stackctl-1.5.0.1
Safe HaskellSafe-Inferred
LanguageHaskell2010

Stackctl.Prelude

Synopsis

Documentation

(++) :: [a] -> [a] -> [a] infixr 5 #

Append two lists, i.e.,

[x1, ..., xm] ++ [y1, ..., yn] == [x1, ..., xm, y1, ..., yn]
[x1, ..., xm] ++ [y1, ...] == [x1, ..., xm, y1, ...]

If the first list is not finite, the result is the first list.

seq :: forall {r :: RuntimeRep} a (b :: TYPE r). a -> b -> b infixr 0 #

The value of seq a b is bottom if a is bottom, and otherwise equal to b. In other words, it evaluates the first argument a to weak head normal form (WHNF). seq is usually introduced to improve performance by avoiding unneeded laziness.

A note on evaluation order: the expression seq a b does not guarantee that a will be evaluated before b. The only guarantee given by seq is that the both a and b will be evaluated before seq returns a value. In particular, this means that b may be evaluated before a. If you need to guarantee a specific order of evaluation, you must use the function pseq from the "parallel" package.

filter :: (a -> Bool) -> [a] -> [a] #

\(\mathcal{O}(n)\). filter, applied to a predicate and a list, returns the list of those elements that satisfy the predicate; i.e.,

filter p xs = [ x | x <- xs, p x]
>>> filter odd [1, 2, 3]
[1,3]

zip :: [a] -> [b] -> [(a, b)] #

\(\mathcal{O}(\min(m,n))\). zip takes two lists and returns a list of corresponding pairs.

>>> zip [1, 2] ['a', 'b']
[(1,'a'),(2,'b')]

If one input list is shorter than the other, excess elements of the longer list are discarded, even if one of the lists is infinite:

>>> zip [1] ['a', 'b']
[(1,'a')]
>>> zip [1, 2] ['a']
[(1,'a')]
>>> zip [] [1..]
[]
>>> zip [1..] []
[]

zip is right-lazy:

>>> zip [] undefined
[]
>>> zip undefined []
*** Exception: Prelude.undefined
...

zip is capable of list fusion, but it is restricted to its first list argument and its resulting list.

fst :: (a, b) -> a #

Extract the first component of a pair.

snd :: (a, b) -> b #

Extract the second component of a pair.

otherwise :: Bool #

otherwise is defined as the value True. It helps to make guards more readable. eg.

 f x | x < 0     = ...
     | otherwise = ...

assert :: Bool -> a -> a #

If the first argument evaluates to True, then the result is the second argument. Otherwise an AssertionFailed exception is raised, containing a String with the source file and line number of the call to assert.

Assertions can normally be turned on or off with a compiler flag (for GHC, assertions are normally on unless optimisation is turned on with -O or the -fignore-asserts option is given). When assertions are turned off, the first argument to assert is ignored, and the second argument is returned as the result.

map :: (a -> b) -> [a] -> [b] #

\(\mathcal{O}(n)\). map f xs is the list obtained by applying f to each element of xs, i.e.,

map f [x1, x2, ..., xn] == [f x1, f x2, ..., f xn]
map f [x1, x2, ...] == [f x1, f x2, ...]
>>> map (+1) [1, 2, 3]
[2,3,4]

($) :: forall (r :: RuntimeRep) a (b :: TYPE r). (a -> b) -> a -> b infixr 0 #

Application operator. This operator is redundant, since ordinary application (f x) means the same as (f $ x). However, $ has low, right-associative binding precedence, so it sometimes allows parentheses to be omitted; for example:

f $ g $ h x  =  f (g (h x))

It is also useful in higher-order situations, such as map ($ 0) xs, or zipWith ($) fs xs.

Note that ($) is levity-polymorphic in its result type, so that foo $ True where foo :: Bool -> Int# is well-typed.

fromIntegral :: (Integral a, Num b) => a -> b #

general coercion from integral types

realToFrac :: (Real a, Fractional b) => a -> b #

general coercion to fractional types

guard :: Alternative f => Bool -> f () #

Conditional failure of Alternative computations. Defined by

guard True  = pure ()
guard False = empty

Examples

Expand

Common uses of guard include conditionally signaling an error in an error monad and conditionally rejecting the current choice in an Alternative-based parser.

As an example of signaling an error in the error monad Maybe, consider a safe division function safeDiv x y that returns Nothing when the denominator y is zero and Just (x `div` y) otherwise. For example:

>>> safeDiv 4 0
Nothing
>>> safeDiv 4 2
Just 2

A definition of safeDiv using guards, but not guard:

safeDiv :: Int -> Int -> Maybe Int
safeDiv x y | y /= 0    = Just (x `div` y)
            | otherwise = Nothing

A definition of safeDiv using guard and Monad do-notation:

safeDiv :: Int -> Int -> Maybe Int
safeDiv x y = do
  guard (y /= 0)
  return (x `div` y)

join :: Monad m => m (m a) -> m a #

The join function is the conventional monad join operator. It is used to remove one level of monadic structure, projecting its bound argument into the outer level.

'join bss' can be understood as the do expression

do bs <- bss
   bs

Examples

Expand

A common use of join is to run an IO computation returned from an STM transaction, since STM transactions can't perform IO directly. Recall that

atomically :: STM a -> IO a

is used to run STM transactions atomically. So, by specializing the types of atomically and join to

atomically :: STM (IO b) -> IO (IO b)
join       :: IO (IO b)  -> IO b

we can compose them as

join . atomically :: STM (IO b) -> IO b

to run an STM transaction and the IO action it returns.

class Bounded a where #

The Bounded class is used to name the upper and lower limits of a type. Ord is not a superclass of Bounded since types that are not totally ordered may also have upper and lower bounds.

The Bounded class may be derived for any enumeration type; minBound is the first constructor listed in the data declaration and maxBound is the last. Bounded may also be derived for single-constructor datatypes whose constituent types are in Bounded.

Methods

minBound :: a #

maxBound :: a #

Instances

Instances details
Bounded Finality 
Instance details

Defined in Amazonka.Env.Hooks

Bounded All

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

minBound :: All #

maxBound :: All #

Bounded Any

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

minBound :: Any #

maxBound :: Any #

Bounded CBool 
Instance details

Defined in Foreign.C.Types

Bounded CChar 
Instance details

Defined in Foreign.C.Types

Bounded CInt 
Instance details

Defined in Foreign.C.Types

Bounded CIntMax 
Instance details

Defined in Foreign.C.Types

Bounded CIntPtr 
Instance details

Defined in Foreign.C.Types

Bounded CLLong 
Instance details

Defined in Foreign.C.Types

Bounded CLong 
Instance details

Defined in Foreign.C.Types

Bounded CPtrdiff 
Instance details

Defined in Foreign.C.Types

Bounded CSChar 
Instance details

Defined in Foreign.C.Types

Bounded CShort 
Instance details

Defined in Foreign.C.Types

Bounded CSigAtomic 
Instance details

Defined in Foreign.C.Types

Bounded CSize 
Instance details

Defined in Foreign.C.Types

Bounded CUChar 
Instance details

Defined in Foreign.C.Types

Bounded CUInt 
Instance details

Defined in Foreign.C.Types

Bounded CUIntMax 
Instance details

Defined in Foreign.C.Types

Bounded CUIntPtr 
Instance details

Defined in Foreign.C.Types

Bounded CULLong 
Instance details

Defined in Foreign.C.Types

Bounded CULong 
Instance details

Defined in Foreign.C.Types

Bounded CUShort 
Instance details

Defined in Foreign.C.Types

Bounded CWchar 
Instance details

Defined in Foreign.C.Types

Bounded Associativity

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Bounded DecidedStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Bounded SourceStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Bounded SourceUnpackedness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Bounded Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Bounded Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Bounded Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Bounded Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Bounded GeneralCategory

Since: base-2.1

Instance details

Defined in GHC.Unicode

Bounded Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Bounded Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Bounded Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Bounded Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Bounded CBlkCnt 
Instance details

Defined in System.Posix.Types

Bounded CBlkSize 
Instance details

Defined in System.Posix.Types

Bounded CClockId 
Instance details

Defined in System.Posix.Types

Bounded CDev 
Instance details

Defined in System.Posix.Types

Bounded CFsBlkCnt 
Instance details

Defined in System.Posix.Types

Bounded CFsFilCnt 
Instance details

Defined in System.Posix.Types

Bounded CGid 
Instance details

Defined in System.Posix.Types

Bounded CId 
Instance details

Defined in System.Posix.Types

Methods

minBound :: CId #

maxBound :: CId #

Bounded CIno 
Instance details

Defined in System.Posix.Types

Bounded CKey 
Instance details

Defined in System.Posix.Types

Bounded CMode 
Instance details

Defined in System.Posix.Types

Bounded CNfds 
Instance details

Defined in System.Posix.Types

Bounded CNlink 
Instance details

Defined in System.Posix.Types

Bounded COff 
Instance details

Defined in System.Posix.Types

Bounded CPid 
Instance details

Defined in System.Posix.Types

Bounded CRLim 
Instance details

Defined in System.Posix.Types

Bounded CSocklen 
Instance details

Defined in System.Posix.Types

Bounded CSsize 
Instance details

Defined in System.Posix.Types

Bounded CTcflag 
Instance details

Defined in System.Posix.Types

Bounded CUid 
Instance details

Defined in System.Posix.Types

Bounded Fd 
Instance details

Defined in System.Posix.Types

Methods

minBound :: Fd #

maxBound :: Fd #

Bounded Encoding 
Instance details

Defined in Basement.String

Bounded UTF32_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF32

Methods

minBound :: UTF32_Invalid #

maxBound :: UTF32_Invalid #

Bounded Extension 
Instance details

Defined in GHC.LanguageExtensions.Type

Bounded Ordering

Since: base-2.1

Instance details

Defined in GHC.Enum

Bounded StdMethod 
Instance details

Defined in Network.HTTP.Types.Method

Bounded Status 
Instance details

Defined in Network.HTTP.Types.Status

Bounded IPv4 
Instance details

Defined in Data.IP.Addr

Bounded IPv6 
Instance details

Defined in Data.IP.Addr

Bounded RequiredVersionOp Source # 
Instance details

Defined in Stackctl.Config.RequiredVersion

Bounded Format Source # 
Instance details

Defined in Stackctl.Spec.Changes.Format

Bounded CompressionStrategy 
Instance details

Defined in Codec.Compression.Zlib.Stream

Bounded Format 
Instance details

Defined in Codec.Compression.Zlib.Stream

Bounded Method 
Instance details

Defined in Codec.Compression.Zlib.Stream

Bounded ()

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

minBound :: () #

maxBound :: () #

Bounded Bool

Since: base-2.1

Instance details

Defined in GHC.Enum

Bounded Char

Since: base-2.1

Instance details

Defined in GHC.Enum

Bounded Int

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

minBound :: Int #

maxBound :: Int #

Bounded Levity

Since: base-4.16.0.0

Instance details

Defined in GHC.Enum

Bounded VecCount

Since: base-4.10.0.0

Instance details

Defined in GHC.Enum

Bounded VecElem

Since: base-4.10.0.0

Instance details

Defined in GHC.Enum

Bounded Word

Since: base-2.1

Instance details

Defined in GHC.Enum

Bounded a => Bounded (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Bounded a => Bounded (Down a)

Swaps minBound and maxBound of the underlying type.

Since: base-4.14.0.0

Instance details

Defined in Data.Ord

Methods

minBound :: Down a #

maxBound :: Down a #

Bounded a => Bounded (First a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

minBound :: First a #

maxBound :: First a #

Bounded a => Bounded (Last a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

minBound :: Last a #

maxBound :: Last a #

Bounded a => Bounded (Max a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

minBound :: Max a #

maxBound :: Max a #

Bounded a => Bounded (Min a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

minBound :: Min a #

maxBound :: Min a #

Bounded m => Bounded (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Bounded a => Bounded (Dual a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

minBound :: Dual a #

maxBound :: Dual a #

Bounded a => Bounded (Product a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Bounded a => Bounded (Sum a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

minBound :: Sum a #

maxBound :: Sum a #

SizeValid n => Bounded (Bits n) 
Instance details

Defined in Basement.Bits

Methods

minBound :: Bits n #

maxBound :: Bits n #

Bounded a => Bounded (a) 
Instance details

Defined in GHC.Enum

Methods

minBound :: (a) #

maxBound :: (a) #

Bounded (Proxy t)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

minBound :: Proxy t #

maxBound :: Proxy t #

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

Defined in Data.Strict.Tuple

Methods

minBound :: Pair a b #

maxBound :: Pair a b #

(Bounded a, Bounded b) => Bounded (a, b)

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b) #

maxBound :: (a, b) #

Bounded a => Bounded (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

minBound :: Const a b #

maxBound :: Const a b #

(Applicative f, Bounded a) => Bounded (Ap f a)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

minBound :: Ap f a #

maxBound :: Ap f a #

a ~ b => Bounded (a :~: b)

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Equality

Methods

minBound :: a :~: b #

maxBound :: a :~: b #

Bounded b => Bounded (Tagged s b) 
Instance details

Defined in Data.Tagged

Methods

minBound :: Tagged s b #

maxBound :: Tagged s b #

(Bounded a, Bounded b, Bounded c) => Bounded (a, b, c)

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c) #

maxBound :: (a, b, c) #

a ~~ b => Bounded (a :~~: b)

Since: base-4.10.0.0

Instance details

Defined in Data.Type.Equality

Methods

minBound :: a :~~: b #

maxBound :: a :~~: b #

(Bounded a, Bounded b, Bounded c, Bounded d) => Bounded (a, b, c, d)

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d) #

maxBound :: (a, b, c, d) #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e) => Bounded (a, b, c, d, e)

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d, e) #

maxBound :: (a, b, c, d, e) #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f) => Bounded (a, b, c, d, e, f)

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d, e, f) #

maxBound :: (a, b, c, d, e, f) #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g) => Bounded (a, b, c, d, e, f, g)

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d, e, f, g) #

maxBound :: (a, b, c, d, e, f, g) #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h) => Bounded (a, b, c, d, e, f, g, h)

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d, e, f, g, h) #

maxBound :: (a, b, c, d, e, f, g, h) #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i) => Bounded (a, b, c, d, e, f, g, h, i)

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d, e, f, g, h, i) #

maxBound :: (a, b, c, d, e, f, g, h, i) #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i, Bounded j) => Bounded (a, b, c, d, e, f, g, h, i, j)

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d, e, f, g, h, i, j) #

maxBound :: (a, b, c, d, e, f, g, h, i, j) #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i, Bounded j, Bounded k) => Bounded (a, b, c, d, e, f, g, h, i, j, k)

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d, e, f, g, h, i, j, k) #

maxBound :: (a, b, c, d, e, f, g, h, i, j, k) #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i, Bounded j, Bounded k, Bounded l) => Bounded (a, b, c, d, e, f, g, h, i, j, k, l)

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d, e, f, g, h, i, j, k, l) #

maxBound :: (a, b, c, d, e, f, g, h, i, j, k, l) #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i, Bounded j, Bounded k, Bounded l, Bounded m) => Bounded (a, b, c, d, e, f, g, h, i, j, k, l, m)

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d, e, f, g, h, i, j, k, l, m) #

maxBound :: (a, b, c, d, e, f, g, h, i, j, k, l, m) #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i, Bounded j, Bounded k, Bounded l, Bounded m, Bounded n) => Bounded (a, b, c, d, e, f, g, h, i, j, k, l, m, n)

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) #

maxBound :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i, Bounded j, Bounded k, Bounded l, Bounded m, Bounded n, Bounded o) => Bounded (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) #

maxBound :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) #

class Enum a where #

Class Enum defines operations on sequentially ordered types.

The enumFrom... methods are used in Haskell's translation of arithmetic sequences.

Instances of Enum may be derived for any enumeration type (types whose constructors have no fields). The nullary constructors are assumed to be numbered left-to-right by fromEnum from 0 through n-1. See Chapter 10 of the Haskell Report for more details.

For any type that is an instance of class Bounded as well as Enum, the following should hold:

   enumFrom     x   = enumFromTo     x maxBound
   enumFromThen x y = enumFromThenTo x y bound
     where
       bound | fromEnum y >= fromEnum x = maxBound
             | otherwise                = minBound

Minimal complete definition

toEnum, fromEnum

Methods

fromEnum :: a -> Int #

Convert to an Int. It is implementation-dependent what fromEnum returns when applied to a value that is too large to fit in an Int.

Instances

Instances details
Enum Finality 
Instance details

Defined in Amazonka.Env.Hooks

Enum LogLevel 
Instance details

Defined in Amazonka.Logger

Enum ChunkSize 
Instance details

Defined in Amazonka.Data.Body

Enum Seconds 
Instance details

Defined in Amazonka.Types

Enum CBool 
Instance details

Defined in Foreign.C.Types

Enum CChar 
Instance details

Defined in Foreign.C.Types

Enum CClock 
Instance details

Defined in Foreign.C.Types

Enum CDouble 
Instance details

Defined in Foreign.C.Types

Enum CFloat 
Instance details

Defined in Foreign.C.Types

Enum CInt 
Instance details

Defined in Foreign.C.Types

Methods

succ :: CInt -> CInt #

pred :: CInt -> CInt #

toEnum :: Int -> CInt #

fromEnum :: CInt -> Int #

enumFrom :: CInt -> [CInt] #

enumFromThen :: CInt -> CInt -> [CInt] #

enumFromTo :: CInt -> CInt -> [CInt] #

enumFromThenTo :: CInt -> CInt -> CInt -> [CInt] #

Enum CIntMax 
Instance details

Defined in Foreign.C.Types

Enum CIntPtr 
Instance details

Defined in Foreign.C.Types

Enum CLLong 
Instance details

Defined in Foreign.C.Types

Enum CLong 
Instance details

Defined in Foreign.C.Types

Enum CPtrdiff 
Instance details

Defined in Foreign.C.Types

Enum CSChar 
Instance details

Defined in Foreign.C.Types

Enum CSUSeconds 
Instance details

Defined in Foreign.C.Types

Enum CShort 
Instance details

Defined in Foreign.C.Types

Enum CSigAtomic 
Instance details

Defined in Foreign.C.Types

Enum CSize 
Instance details

Defined in Foreign.C.Types

Enum CTime 
Instance details

Defined in Foreign.C.Types

Enum CUChar 
Instance details

Defined in Foreign.C.Types

Enum CUInt 
Instance details

Defined in Foreign.C.Types

Enum CUIntMax 
Instance details

Defined in Foreign.C.Types

Enum CUIntPtr 
Instance details

Defined in Foreign.C.Types

Enum CULLong 
Instance details

Defined in Foreign.C.Types

Enum CULong 
Instance details

Defined in Foreign.C.Types

Enum CUSeconds 
Instance details

Defined in Foreign.C.Types

Enum CUShort 
Instance details

Defined in Foreign.C.Types

Enum CWchar 
Instance details

Defined in Foreign.C.Types

Enum Associativity

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Enum DecidedStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Enum SourceStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Enum SourceUnpackedness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Enum SeekMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Device

Enum IOMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.IOMode

Enum Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Enum Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Enum Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Enum Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

succ :: Int8 -> Int8 #

pred :: Int8 -> Int8 #

toEnum :: Int -> Int8 #

fromEnum :: Int8 -> Int #

enumFrom :: Int8 -> [Int8] #

enumFromThen :: Int8 -> Int8 -> [Int8] #

enumFromTo :: Int8 -> Int8 -> [Int8] #

enumFromThenTo :: Int8 -> Int8 -> Int8 -> [Int8] #

Enum DoCostCentres

Since: base-4.8.0.0

Instance details

Defined in GHC.RTS.Flags

Enum DoHeapProfile

Since: base-4.8.0.0

Instance details

Defined in GHC.RTS.Flags

Enum DoTrace

Since: base-4.8.0.0

Instance details

Defined in GHC.RTS.Flags

Enum GiveGCStats

Since: base-4.8.0.0

Instance details

Defined in GHC.RTS.Flags

Enum IoSubSystem

Since: base-4.9.0.0

Instance details

Defined in GHC.RTS.Flags

Enum GeneralCategory

Since: base-2.1

Instance details

Defined in GHC.Unicode

Enum Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Enum Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Enum Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Enum Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Enum CBlkCnt 
Instance details

Defined in System.Posix.Types

Enum CBlkSize 
Instance details

Defined in System.Posix.Types

Enum CCc 
Instance details

Defined in System.Posix.Types

Methods

succ :: CCc -> CCc #

pred :: CCc -> CCc #

toEnum :: Int -> CCc #

fromEnum :: CCc -> Int #

enumFrom :: CCc -> [CCc] #

enumFromThen :: CCc -> CCc -> [CCc] #

enumFromTo :: CCc -> CCc -> [CCc] #

enumFromThenTo :: CCc -> CCc -> CCc -> [CCc] #

Enum CClockId 
Instance details

Defined in System.Posix.Types

Enum CDev 
Instance details

Defined in System.Posix.Types

Methods

succ :: CDev -> CDev #

pred :: CDev -> CDev #

toEnum :: Int -> CDev #

fromEnum :: CDev -> Int #

enumFrom :: CDev -> [CDev] #

enumFromThen :: CDev -> CDev -> [CDev] #

enumFromTo :: CDev -> CDev -> [CDev] #

enumFromThenTo :: CDev -> CDev -> CDev -> [CDev] #

Enum CFsBlkCnt 
Instance details

Defined in System.Posix.Types

Enum CFsFilCnt 
Instance details

Defined in System.Posix.Types

Enum CGid 
Instance details

Defined in System.Posix.Types

Methods

succ :: CGid -> CGid #

pred :: CGid -> CGid #

toEnum :: Int -> CGid #

fromEnum :: CGid -> Int #

enumFrom :: CGid -> [CGid] #

enumFromThen :: CGid -> CGid -> [CGid] #

enumFromTo :: CGid -> CGid -> [CGid] #

enumFromThenTo :: CGid -> CGid -> CGid -> [CGid] #

Enum CId 
Instance details

Defined in System.Posix.Types

Methods

succ :: CId -> CId #

pred :: CId -> CId #

toEnum :: Int -> CId #

fromEnum :: CId -> Int #

enumFrom :: CId -> [CId] #

enumFromThen :: CId -> CId -> [CId] #

enumFromTo :: CId -> CId -> [CId] #

enumFromThenTo :: CId -> CId -> CId -> [CId] #

Enum CIno 
Instance details

Defined in System.Posix.Types

Methods

succ :: CIno -> CIno #

pred :: CIno -> CIno #

toEnum :: Int -> CIno #

fromEnum :: CIno -> Int #

enumFrom :: CIno -> [CIno] #

enumFromThen :: CIno -> CIno -> [CIno] #

enumFromTo :: CIno -> CIno -> [CIno] #

enumFromThenTo :: CIno -> CIno -> CIno -> [CIno] #

Enum CKey 
Instance details

Defined in System.Posix.Types

Methods

succ :: CKey -> CKey #

pred :: CKey -> CKey #

toEnum :: Int -> CKey #

fromEnum :: CKey -> Int #

enumFrom :: CKey -> [CKey] #

enumFromThen :: CKey -> CKey -> [CKey] #

enumFromTo :: CKey -> CKey -> [CKey] #

enumFromThenTo :: CKey -> CKey -> CKey -> [CKey] #

Enum CMode 
Instance details

Defined in System.Posix.Types

Enum CNfds 
Instance details

Defined in System.Posix.Types

Enum CNlink 
Instance details

Defined in System.Posix.Types

Enum COff 
Instance details

Defined in System.Posix.Types

Methods

succ :: COff -> COff #

pred :: COff -> COff #

toEnum :: Int -> COff #

fromEnum :: COff -> Int #

enumFrom :: COff -> [COff] #

enumFromThen :: COff -> COff -> [COff] #

enumFromTo :: COff -> COff -> [COff] #

enumFromThenTo :: COff -> COff -> COff -> [COff] #

Enum CPid 
Instance details

Defined in System.Posix.Types

Methods

succ :: CPid -> CPid #

pred :: CPid -> CPid #

toEnum :: Int -> CPid #

fromEnum :: CPid -> Int #

enumFrom :: CPid -> [CPid] #

enumFromThen :: CPid -> CPid -> [CPid] #

enumFromTo :: CPid -> CPid -> [CPid] #

enumFromThenTo :: CPid -> CPid -> CPid -> [CPid] #

Enum CRLim 
Instance details

Defined in System.Posix.Types

Enum CSocklen 
Instance details

Defined in System.Posix.Types

Enum CSpeed 
Instance details

Defined in System.Posix.Types

Enum CSsize 
Instance details

Defined in System.Posix.Types

Enum CTcflag 
Instance details

Defined in System.Posix.Types

Enum CUid 
Instance details

Defined in System.Posix.Types

Methods

succ :: CUid -> CUid #

pred :: CUid -> CUid #

toEnum :: Int -> CUid #

fromEnum :: CUid -> Int #

enumFrom :: CUid -> [CUid] #

enumFromThen :: CUid -> CUid -> [CUid] #

enumFromTo :: CUid -> CUid -> [CUid] #

enumFromThenTo :: CUid -> CUid -> CUid -> [CUid] #

Enum Fd 
Instance details

Defined in System.Posix.Types

Methods

succ :: Fd -> Fd #

pred :: Fd -> Fd #

toEnum :: Int -> Fd #

fromEnum :: Fd -> Int #

enumFrom :: Fd -> [Fd] #

enumFromThen :: Fd -> Fd -> [Fd] #

enumFromTo :: Fd -> Fd -> [Fd] #

enumFromThenTo :: Fd -> Fd -> Fd -> [Fd] #

Enum Encoding 
Instance details

Defined in Basement.String

Enum UTF32_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF32

Methods

succ :: UTF32_Invalid -> UTF32_Invalid #

pred :: UTF32_Invalid -> UTF32_Invalid #

toEnum :: Int -> UTF32_Invalid #

fromEnum :: UTF32_Invalid -> Int #

enumFrom :: UTF32_Invalid -> [UTF32_Invalid] #

enumFromThen :: UTF32_Invalid -> UTF32_Invalid -> [UTF32_Invalid] #

enumFromTo :: UTF32_Invalid -> UTF32_Invalid -> [UTF32_Invalid] #

enumFromThenTo :: UTF32_Invalid -> UTF32_Invalid -> UTF32_Invalid -> [UTF32_Invalid] #

Enum CryptoError 
Instance details

Defined in Crypto.Error.Types

Enum Extension 
Instance details

Defined in GHC.LanguageExtensions.Type

Enum Ordering

Since: base-2.1

Instance details

Defined in GHC.Enum

Enum StdMethod 
Instance details

Defined in Network.HTTP.Types.Method

Enum Status 
Instance details

Defined in Network.HTTP.Types.Status

Enum IP 
Instance details

Defined in Data.IP.Addr

Methods

succ :: IP -> IP #

pred :: IP -> IP #

toEnum :: Int -> IP #

fromEnum :: IP -> Int #

enumFrom :: IP -> [IP] #

enumFromThen :: IP -> IP -> [IP] #

enumFromTo :: IP -> IP -> [IP] #

enumFromThenTo :: IP -> IP -> IP -> [IP] #

Enum IPv4 
Instance details

Defined in Data.IP.Addr

Methods

succ :: IPv4 -> IPv4 #

pred :: IPv4 -> IPv4 #

toEnum :: Int -> IPv4 #

fromEnum :: IPv4 -> Int #

enumFrom :: IPv4 -> [IPv4] #

enumFromThen :: IPv4 -> IPv4 -> [IPv4] #

enumFromTo :: IPv4 -> IPv4 -> [IPv4] #

enumFromThenTo :: IPv4 -> IPv4 -> IPv4 -> [IPv4] #

Enum IPv6 
Instance details

Defined in Data.IP.Addr

Methods

succ :: IPv6 -> IPv6 #

pred :: IPv6 -> IPv6 #

toEnum :: Int -> IPv6 #

fromEnum :: IPv6 -> Int #

enumFrom :: IPv6 -> [IPv6] #

enumFromThen :: IPv6 -> IPv6 -> [IPv6] #

enumFromTo :: IPv6 -> IPv6 -> [IPv6] #

enumFromThenTo :: IPv6 -> IPv6 -> IPv6 -> [IPv6] #

Enum RequiredVersionOp Source # 
Instance details

Defined in Stackctl.Config.RequiredVersion

Enum Format Source # 
Instance details

Defined in Stackctl.Spec.Changes.Format

Enum Day 
Instance details

Defined in Data.Time.Calendar.Days

Methods

succ :: Day -> Day #

pred :: Day -> Day #

toEnum :: Int -> Day #

fromEnum :: Day -> Int #

enumFrom :: Day -> [Day] #

enumFromThen :: Day -> Day -> [Day] #

enumFromTo :: Day -> Day -> [Day] #

enumFromThenTo :: Day -> Day -> Day -> [Day] #

Enum DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Enum CompressionStrategy 
Instance details

Defined in Codec.Compression.Zlib.Stream

Enum Format 
Instance details

Defined in Codec.Compression.Zlib.Stream

Enum Method 
Instance details

Defined in Codec.Compression.Zlib.Stream

Enum Integer

Since: base-2.1

Instance details

Defined in GHC.Enum

Enum Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Enum

Enum ()

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

succ :: () -> () #

pred :: () -> () #

toEnum :: Int -> () #

fromEnum :: () -> Int #

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

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

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

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

Enum Bool

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

succ :: Bool -> Bool #

pred :: Bool -> Bool #

toEnum :: Int -> Bool #

fromEnum :: Bool -> Int #

enumFrom :: Bool -> [Bool] #

enumFromThen :: Bool -> Bool -> [Bool] #

enumFromTo :: Bool -> Bool -> [Bool] #

enumFromThenTo :: Bool -> Bool -> Bool -> [Bool] #

Enum Char

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

succ :: Char -> Char #

pred :: Char -> Char #

toEnum :: Int -> Char #

fromEnum :: Char -> Int #

enumFrom :: Char -> [Char] #

enumFromThen :: Char -> Char -> [Char] #

enumFromTo :: Char -> Char -> [Char] #

enumFromThenTo :: Char -> Char -> Char -> [Char] #

Enum Int

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

succ :: Int -> Int #

pred :: Int -> Int #

toEnum :: Int -> Int #

fromEnum :: Int -> Int #

enumFrom :: Int -> [Int] #

enumFromThen :: Int -> Int -> [Int] #

enumFromTo :: Int -> Int -> [Int] #

enumFromThenTo :: Int -> Int -> Int -> [Int] #

Enum Levity

Since: base-4.16.0.0

Instance details

Defined in GHC.Enum

Enum VecCount

Since: base-4.10.0.0

Instance details

Defined in GHC.Enum

Enum VecElem

Since: base-4.10.0.0

Instance details

Defined in GHC.Enum

Enum Word

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

succ :: Word -> Word #

pred :: Word -> Word #

toEnum :: Int -> Word #

fromEnum :: Word -> Int #

enumFrom :: Word -> [Word] #

enumFromThen :: Word -> Word -> [Word] #

enumFromTo :: Word -> Word -> [Word] #

enumFromThenTo :: Word -> Word -> Word -> [Word] #

Enum a => Enum (Blind a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

succ :: Blind a -> Blind a #

pred :: Blind a -> Blind a #

toEnum :: Int -> Blind a #

fromEnum :: Blind a -> Int #

enumFrom :: Blind a -> [Blind a] #

enumFromThen :: Blind a -> Blind a -> [Blind a] #

enumFromTo :: Blind a -> Blind a -> [Blind a] #

enumFromThenTo :: Blind a -> Blind a -> Blind a -> [Blind a] #

Enum a => Enum (Fixed a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

succ :: Fixed a -> Fixed a #

pred :: Fixed a -> Fixed a #

toEnum :: Int -> Fixed a #

fromEnum :: Fixed a -> Int #

enumFrom :: Fixed a -> [Fixed a] #

enumFromThen :: Fixed a -> Fixed a -> [Fixed a] #

enumFromTo :: Fixed a -> Fixed a -> [Fixed a] #

enumFromThenTo :: Fixed a -> Fixed a -> Fixed a -> [Fixed a] #

Enum a => Enum (Large a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

succ :: Large a -> Large a #

pred :: Large a -> Large a #

toEnum :: Int -> Large a #

fromEnum :: Large a -> Int #

enumFrom :: Large a -> [Large a] #

enumFromThen :: Large a -> Large a -> [Large a] #

enumFromTo :: Large a -> Large a -> [Large a] #

enumFromThenTo :: Large a -> Large a -> Large a -> [Large a] #

Enum a => Enum (Negative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Enum a => Enum (NonNegative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Enum a => Enum (NonPositive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Enum a => Enum (NonZero a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

succ :: NonZero a -> NonZero a #

pred :: NonZero a -> NonZero a #

toEnum :: Int -> NonZero a #

fromEnum :: NonZero a -> Int #

enumFrom :: NonZero a -> [NonZero a] #

enumFromThen :: NonZero a -> NonZero a -> [NonZero a] #

enumFromTo :: NonZero a -> NonZero a -> [NonZero a] #

enumFromThenTo :: NonZero a -> NonZero a -> NonZero a -> [NonZero a] #

Enum a => Enum (Positive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Enum a => Enum (Shrink2 a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

succ :: Shrink2 a -> Shrink2 a #

pred :: Shrink2 a -> Shrink2 a #

toEnum :: Int -> Shrink2 a #

fromEnum :: Shrink2 a -> Int #

enumFrom :: Shrink2 a -> [Shrink2 a] #

enumFromThen :: Shrink2 a -> Shrink2 a -> [Shrink2 a] #

enumFromTo :: Shrink2 a -> Shrink2 a -> [Shrink2 a] #

enumFromThenTo :: Shrink2 a -> Shrink2 a -> Shrink2 a -> [Shrink2 a] #

Enum a => Enum (Small a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

succ :: Small a -> Small a #

pred :: Small a -> Small a #

toEnum :: Int -> Small a #

fromEnum :: Small a -> Int #

enumFrom :: Small a -> [Small a] #

enumFromThen :: Small a -> Small a -> [Small a] #

enumFromTo :: Small a -> Small a -> [Small a] #

enumFromThenTo :: Small a -> Small a -> Small a -> [Small a] #

Enum a => Enum (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Enum a => Enum (First a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

succ :: First a -> First a #

pred :: First a -> First a #

toEnum :: Int -> First a #

fromEnum :: First a -> Int #

enumFrom :: First a -> [First a] #

enumFromThen :: First a -> First a -> [First a] #

enumFromTo :: First a -> First a -> [First a] #

enumFromThenTo :: First a -> First a -> First a -> [First a] #

Enum a => Enum (Last a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

succ :: Last a -> Last a #

pred :: Last a -> Last a #

toEnum :: Int -> Last a #

fromEnum :: Last a -> Int #

enumFrom :: Last a -> [Last a] #

enumFromThen :: Last a -> Last a -> [Last a] #

enumFromTo :: Last a -> Last a -> [Last a] #

enumFromThenTo :: Last a -> Last a -> Last a -> [Last a] #

Enum a => Enum (Max a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

succ :: Max a -> Max a #

pred :: Max a -> Max a #

toEnum :: Int -> Max a #

fromEnum :: Max a -> Int #

enumFrom :: Max a -> [Max a] #

enumFromThen :: Max a -> Max a -> [Max a] #

enumFromTo :: Max a -> Max a -> [Max a] #

enumFromThenTo :: Max a -> Max a -> Max a -> [Max a] #

Enum a => Enum (Min a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

succ :: Min a -> Min a #

pred :: Min a -> Min a #

toEnum :: Int -> Min a #

fromEnum :: Min a -> Int #

enumFrom :: Min a -> [Min a] #

enumFromThen :: Min a -> Min a -> [Min a] #

enumFromTo :: Min a -> Min a -> [Min a] #

enumFromThenTo :: Min a -> Min a -> Min a -> [Min a] #

Enum a => Enum (WrappedMonoid a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Integral a => Enum (Ratio a)

Since: base-2.0.1

Instance details

Defined in GHC.Real

Methods

succ :: Ratio a -> Ratio a #

pred :: Ratio a -> Ratio a #

toEnum :: Int -> Ratio a #

fromEnum :: Ratio a -> Int #

enumFrom :: Ratio a -> [Ratio a] #

enumFromThen :: Ratio a -> Ratio a -> [Ratio a] #

enumFromTo :: Ratio a -> Ratio a -> [Ratio a] #

enumFromThenTo :: Ratio a -> Ratio a -> Ratio a -> [Ratio a] #

SizeValid n => Enum (Bits n) 
Instance details

Defined in Basement.Bits

Methods

succ :: Bits n -> Bits n #

pred :: Bits n -> Bits n #

toEnum :: Int -> Bits n #

fromEnum :: Bits n -> Int #

enumFrom :: Bits n -> [Bits n] #

enumFromThen :: Bits n -> Bits n -> [Bits n] #

enumFromTo :: Bits n -> Bits n -> [Bits n] #

enumFromThenTo :: Bits n -> Bits n -> Bits n -> [Bits n] #

Enum (CountOf ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

succ :: CountOf ty -> CountOf ty #

pred :: CountOf ty -> CountOf ty #

toEnum :: Int -> CountOf ty #

fromEnum :: CountOf ty -> Int #

enumFrom :: CountOf ty -> [CountOf ty] #

enumFromThen :: CountOf ty -> CountOf ty -> [CountOf ty] #

enumFromTo :: CountOf ty -> CountOf ty -> [CountOf ty] #

enumFromThenTo :: CountOf ty -> CountOf ty -> CountOf ty -> [CountOf ty] #

Enum (Offset ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

succ :: Offset ty -> Offset ty #

pred :: Offset ty -> Offset ty #

toEnum :: Int -> Offset ty #

fromEnum :: Offset ty -> Int #

enumFrom :: Offset ty -> [Offset ty] #

enumFromThen :: Offset ty -> Offset ty -> [Offset ty] #

enumFromTo :: Offset ty -> Offset ty -> [Offset ty] #

enumFromThenTo :: Offset ty -> Offset ty -> Offset ty -> [Offset ty] #

Enum a => Enum (a) 
Instance details

Defined in GHC.Enum

Methods

succ :: (a) -> (a) #

pred :: (a) -> (a) #

toEnum :: Int -> (a) #

fromEnum :: (a) -> Int #

enumFrom :: (a) -> [(a)] #

enumFromThen :: (a) -> (a) -> [(a)] #

enumFromTo :: (a) -> (a) -> [(a)] #

enumFromThenTo :: (a) -> (a) -> (a) -> [(a)] #

Enum (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

succ :: Proxy s -> Proxy s #

pred :: Proxy s -> Proxy s #

toEnum :: Int -> Proxy s #

fromEnum :: Proxy s -> Int #

enumFrom :: Proxy s -> [Proxy s] #

enumFromThen :: Proxy s -> Proxy s -> [Proxy s] #

enumFromTo :: Proxy s -> Proxy s -> [Proxy s] #

enumFromThenTo :: Proxy s -> Proxy s -> Proxy s -> [Proxy s] #

Enum a => Enum (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

succ :: Const a b -> Const a b #

pred :: Const a b -> Const a b #

toEnum :: Int -> Const a b #

fromEnum :: Const a b -> Int #

enumFrom :: Const a b -> [Const a b] #

enumFromThen :: Const a b -> Const a b -> [Const a b] #

enumFromTo :: Const a b -> Const a b -> [Const a b] #

enumFromThenTo :: Const a b -> Const a b -> Const a b -> [Const a b] #

Enum (f a) => Enum (Ap f a)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

succ :: Ap f a -> Ap f a #

pred :: Ap f a -> Ap f a #

toEnum :: Int -> Ap f a #

fromEnum :: Ap f a -> Int #

enumFrom :: Ap f a -> [Ap f a] #

enumFromThen :: Ap f a -> Ap f a -> [Ap f a] #

enumFromTo :: Ap f a -> Ap f a -> [Ap f a] #

enumFromThenTo :: Ap f a -> Ap f a -> Ap f a -> [Ap f a] #

Enum (f a) => Enum (Alt f a)

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

succ :: Alt f a -> Alt f a #

pred :: Alt f a -> Alt f a #

toEnum :: Int -> Alt f a #

fromEnum :: Alt f a -> Int #

enumFrom :: Alt f a -> [Alt f a] #

enumFromThen :: Alt f a -> Alt f a -> [Alt f a] #

enumFromTo :: Alt f a -> Alt f a -> [Alt f a] #

enumFromThenTo :: Alt f a -> Alt f a -> Alt f a -> [Alt f a] #

a ~ b => Enum (a :~: b)

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Equality

Methods

succ :: (a :~: b) -> a :~: b #

pred :: (a :~: b) -> a :~: b #

toEnum :: Int -> a :~: b #

fromEnum :: (a :~: b) -> Int #

enumFrom :: (a :~: b) -> [a :~: b] #

enumFromThen :: (a :~: b) -> (a :~: b) -> [a :~: b] #

enumFromTo :: (a :~: b) -> (a :~: b) -> [a :~: b] #

enumFromThenTo :: (a :~: b) -> (a :~: b) -> (a :~: b) -> [a :~: b] #

Enum a => Enum (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

succ :: Tagged s a -> Tagged s a #

pred :: Tagged s a -> Tagged s a #

toEnum :: Int -> Tagged s a #

fromEnum :: Tagged s a -> Int #

enumFrom :: Tagged s a -> [Tagged s a] #

enumFromThen :: Tagged s a -> Tagged s a -> [Tagged s a] #

enumFromTo :: Tagged s a -> Tagged s a -> [Tagged s a] #

enumFromThenTo :: Tagged s a -> Tagged s a -> Tagged s a -> [Tagged s a] #

a ~~ b => Enum (a :~~: b)

Since: base-4.10.0.0

Instance details

Defined in Data.Type.Equality

Methods

succ :: (a :~~: b) -> a :~~: b #

pred :: (a :~~: b) -> a :~~: b #

toEnum :: Int -> a :~~: b #

fromEnum :: (a :~~: b) -> Int #

enumFrom :: (a :~~: b) -> [a :~~: b] #

enumFromThen :: (a :~~: b) -> (a :~~: b) -> [a :~~: b] #

enumFromTo :: (a :~~: b) -> (a :~~: b) -> [a :~~: b] #

enumFromThenTo :: (a :~~: b) -> (a :~~: b) -> (a :~~: b) -> [a :~~: b] #

class Eq a where #

The Eq class defines equality (==) and inequality (/=). All the basic datatypes exported by the Prelude are instances of Eq, and Eq may be derived for any datatype whose constituents are also instances of Eq.

The Haskell Report defines no laws for Eq. However, instances are encouraged to follow these properties:

Reflexivity
x == x = True
Symmetry
x == y = y == x
Transitivity
if x == y && y == z = True, then x == z = True
Extensionality
if x == y = True and f is a function whose return type is an instance of Eq, then f x == f y = True
Negation
x /= y = not (x == y)

Minimal complete definition: either == or /=.

Minimal complete definition

(==) | (/=)

Methods

(==) :: a -> a -> Bool infix 4 #

(/=) :: a -> a -> Bool infix 4 #

Instances

Instances details
Eq LogLevels 
Instance details

Defined in Blammo.Logging.LogSettings.LogLevels

Eq CompOptions 
Instance details

Defined in System.FilePath.Glob.Base

Eq Pattern 
Instance details

Defined in System.FilePath.Glob.Base

Methods

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

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

Eq Token 
Instance details

Defined in System.FilePath.Glob.Base

Methods

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

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

Eq Shrunk 
Instance details

Defined in Test.QuickCheck.Function

Methods

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

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

Eq ASCIIString 
Instance details

Defined in Test.QuickCheck.Modifiers

Eq PrintableString 
Instance details

Defined in Test.QuickCheck.Modifiers

Eq UnicodeString 
Instance details

Defined in Test.QuickCheck.Modifiers

Eq Key 
Instance details

Defined in Data.Aeson.Key

Methods

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

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

Eq DotNetTime 
Instance details

Defined in Data.Aeson.Types.Internal

Eq JSONPathElement 
Instance details

Defined in Data.Aeson.Types.Internal

Eq SumEncoding 
Instance details

Defined in Data.Aeson.Types.Internal

Eq Value 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

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

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

Eq ConfigProfile 
Instance details

Defined in Amazonka.Auth.ConfigFile

Eq CredentialSource 
Instance details

Defined in Amazonka.Auth.ConfigFile

Eq CachedAccessToken 
Instance details

Defined in Amazonka.Auth.SSO

Eq Autoscaling 
Instance details

Defined in Amazonka.EC2.Metadata

Eq Dynamic 
Instance details

Defined in Amazonka.EC2.Metadata

Methods

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

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

Eq ElasticGpus 
Instance details

Defined in Amazonka.EC2.Metadata

Eq ElasticInference 
Instance details

Defined in Amazonka.EC2.Metadata

Eq Events 
Instance details

Defined in Amazonka.EC2.Metadata

Methods

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

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

Eq IAM 
Instance details

Defined in Amazonka.EC2.Metadata

Methods

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

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

Eq IdentityCredentialsEC2 
Instance details

Defined in Amazonka.EC2.Metadata

Eq IdentityDocument 
Instance details

Defined in Amazonka.EC2.Metadata

Eq Interface 
Instance details

Defined in Amazonka.EC2.Metadata

Eq Maintenance 
Instance details

Defined in Amazonka.EC2.Metadata

Eq Mapping 
Instance details

Defined in Amazonka.EC2.Metadata

Methods

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

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

Eq Metadata 
Instance details

Defined in Amazonka.EC2.Metadata

Eq Placement 
Instance details

Defined in Amazonka.EC2.Metadata

Eq Recommendations 
Instance details

Defined in Amazonka.EC2.Metadata

Eq Services 
Instance details

Defined in Amazonka.EC2.Metadata

Eq Spot 
Instance details

Defined in Amazonka.EC2.Metadata

Methods

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

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

Eq Tags 
Instance details

Defined in Amazonka.EC2.Metadata

Methods

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

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

Eq Finality 
Instance details

Defined in Amazonka.Env.Hooks

Eq LogLevel 
Instance details

Defined in Amazonka.Logger

Eq ActivateType 
Instance details

Defined in Amazonka.CloudFormation.ActivateType

Eq ActivateTypeResponse 
Instance details

Defined in Amazonka.CloudFormation.ActivateType

Eq BatchDescribeTypeConfigurations 
Instance details

Defined in Amazonka.CloudFormation.BatchDescribeTypeConfigurations

Eq BatchDescribeTypeConfigurationsResponse 
Instance details

Defined in Amazonka.CloudFormation.BatchDescribeTypeConfigurations

Eq CancelUpdateStack 
Instance details

Defined in Amazonka.CloudFormation.CancelUpdateStack

Eq CancelUpdateStackResponse 
Instance details

Defined in Amazonka.CloudFormation.CancelUpdateStack

Eq ContinueUpdateRollback 
Instance details

Defined in Amazonka.CloudFormation.ContinueUpdateRollback

Eq ContinueUpdateRollbackResponse 
Instance details

Defined in Amazonka.CloudFormation.ContinueUpdateRollback

Eq CreateChangeSet 
Instance details

Defined in Amazonka.CloudFormation.CreateChangeSet

Eq CreateChangeSetResponse 
Instance details

Defined in Amazonka.CloudFormation.CreateChangeSet

Eq CreateStack 
Instance details

Defined in Amazonka.CloudFormation.CreateStack

Eq CreateStackResponse 
Instance details

Defined in Amazonka.CloudFormation.CreateStack

Eq CreateStackInstances 
Instance details

Defined in Amazonka.CloudFormation.CreateStackInstances

Eq CreateStackInstancesResponse 
Instance details

Defined in Amazonka.CloudFormation.CreateStackInstances

Eq CreateStackSet 
Instance details

Defined in Amazonka.CloudFormation.CreateStackSet

Eq CreateStackSetResponse 
Instance details

Defined in Amazonka.CloudFormation.CreateStackSet

Eq DeactivateType 
Instance details

Defined in Amazonka.CloudFormation.DeactivateType

Eq DeactivateTypeResponse 
Instance details

Defined in Amazonka.CloudFormation.DeactivateType

Eq DeleteChangeSet 
Instance details

Defined in Amazonka.CloudFormation.DeleteChangeSet

Eq DeleteChangeSetResponse 
Instance details

Defined in Amazonka.CloudFormation.DeleteChangeSet

Eq DeleteStack 
Instance details

Defined in Amazonka.CloudFormation.DeleteStack

Eq DeleteStackResponse 
Instance details

Defined in Amazonka.CloudFormation.DeleteStack

Eq DeleteStackInstances 
Instance details

Defined in Amazonka.CloudFormation.DeleteStackInstances

Eq DeleteStackInstancesResponse 
Instance details

Defined in Amazonka.CloudFormation.DeleteStackInstances

Eq DeleteStackSet 
Instance details

Defined in Amazonka.CloudFormation.DeleteStackSet

Eq DeleteStackSetResponse 
Instance details

Defined in Amazonka.CloudFormation.DeleteStackSet

Eq DeregisterType 
Instance details

Defined in Amazonka.CloudFormation.DeregisterType

Eq DeregisterTypeResponse 
Instance details

Defined in Amazonka.CloudFormation.DeregisterType

Eq DescribeAccountLimits 
Instance details

Defined in Amazonka.CloudFormation.DescribeAccountLimits

Eq DescribeAccountLimitsResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeAccountLimits

Eq DescribeChangeSet 
Instance details

Defined in Amazonka.CloudFormation.DescribeChangeSet

Eq DescribeChangeSetResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeChangeSet

Eq DescribeChangeSetHooks 
Instance details

Defined in Amazonka.CloudFormation.DescribeChangeSetHooks

Eq DescribeChangeSetHooksResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeChangeSetHooks

Eq DescribePublisher 
Instance details

Defined in Amazonka.CloudFormation.DescribePublisher

Eq DescribePublisherResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribePublisher

Eq DescribeStackDriftDetectionStatus 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackDriftDetectionStatus

Eq DescribeStackDriftDetectionStatusResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackDriftDetectionStatus

Eq DescribeStackEvents 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackEvents

Eq DescribeStackEventsResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackEvents

Eq DescribeStackInstance 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackInstance

Eq DescribeStackInstanceResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackInstance

Eq DescribeStackResource 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackResource

Eq DescribeStackResourceResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackResource

Eq DescribeStackResourceDrifts 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackResourceDrifts

Eq DescribeStackResourceDriftsResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackResourceDrifts

Eq DescribeStackResources 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackResources

Eq DescribeStackResourcesResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackResources

Eq DescribeStackSet 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackSet

Eq DescribeStackSetResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackSet

Eq DescribeStackSetOperation 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackSetOperation

Eq DescribeStackSetOperationResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackSetOperation

Eq DescribeStacks 
Instance details

Defined in Amazonka.CloudFormation.DescribeStacks

Eq DescribeStacksResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStacks

Eq DescribeType 
Instance details

Defined in Amazonka.CloudFormation.DescribeType

Eq DescribeTypeResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeType

Eq DescribeTypeRegistration 
Instance details

Defined in Amazonka.CloudFormation.DescribeTypeRegistration

Eq DescribeTypeRegistrationResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeTypeRegistration

Eq DetectStackDrift 
Instance details

Defined in Amazonka.CloudFormation.DetectStackDrift

Eq DetectStackDriftResponse 
Instance details

Defined in Amazonka.CloudFormation.DetectStackDrift

Eq DetectStackResourceDrift 
Instance details

Defined in Amazonka.CloudFormation.DetectStackResourceDrift

Eq DetectStackResourceDriftResponse 
Instance details

Defined in Amazonka.CloudFormation.DetectStackResourceDrift

Eq DetectStackSetDrift 
Instance details

Defined in Amazonka.CloudFormation.DetectStackSetDrift

Eq DetectStackSetDriftResponse 
Instance details

Defined in Amazonka.CloudFormation.DetectStackSetDrift

Eq EstimateTemplateCost 
Instance details

Defined in Amazonka.CloudFormation.EstimateTemplateCost

Eq EstimateTemplateCostResponse 
Instance details

Defined in Amazonka.CloudFormation.EstimateTemplateCost

Eq ExecuteChangeSet 
Instance details

Defined in Amazonka.CloudFormation.ExecuteChangeSet

Eq ExecuteChangeSetResponse 
Instance details

Defined in Amazonka.CloudFormation.ExecuteChangeSet

Eq GetStackPolicy 
Instance details

Defined in Amazonka.CloudFormation.GetStackPolicy

Eq GetStackPolicyResponse 
Instance details

Defined in Amazonka.CloudFormation.GetStackPolicy

Eq GetTemplate 
Instance details

Defined in Amazonka.CloudFormation.GetTemplate

Eq GetTemplateResponse 
Instance details

Defined in Amazonka.CloudFormation.GetTemplate

Eq GetTemplateSummary 
Instance details

Defined in Amazonka.CloudFormation.GetTemplateSummary

Eq GetTemplateSummaryResponse 
Instance details

Defined in Amazonka.CloudFormation.GetTemplateSummary

Eq ImportStacksToStackSet 
Instance details

Defined in Amazonka.CloudFormation.ImportStacksToStackSet

Eq ImportStacksToStackSetResponse 
Instance details

Defined in Amazonka.CloudFormation.ImportStacksToStackSet

Eq ListChangeSets 
Instance details

Defined in Amazonka.CloudFormation.ListChangeSets

Eq ListChangeSetsResponse 
Instance details

Defined in Amazonka.CloudFormation.ListChangeSets

Eq ListExports 
Instance details

Defined in Amazonka.CloudFormation.ListExports

Eq ListExportsResponse 
Instance details

Defined in Amazonka.CloudFormation.ListExports

Eq ListImports 
Instance details

Defined in Amazonka.CloudFormation.ListImports

Eq ListImportsResponse 
Instance details

Defined in Amazonka.CloudFormation.ListImports

Eq ListStackInstances 
Instance details

Defined in Amazonka.CloudFormation.ListStackInstances

Eq ListStackInstancesResponse 
Instance details

Defined in Amazonka.CloudFormation.ListStackInstances

Eq ListStackResources 
Instance details

Defined in Amazonka.CloudFormation.ListStackResources

Eq ListStackResourcesResponse 
Instance details

Defined in Amazonka.CloudFormation.ListStackResources

Eq ListStackSetOperationResults 
Instance details

Defined in Amazonka.CloudFormation.ListStackSetOperationResults

Eq ListStackSetOperationResultsResponse 
Instance details

Defined in Amazonka.CloudFormation.ListStackSetOperationResults

Eq ListStackSetOperations 
Instance details

Defined in Amazonka.CloudFormation.ListStackSetOperations

Eq ListStackSetOperationsResponse 
Instance details

Defined in Amazonka.CloudFormation.ListStackSetOperations

Eq ListStackSets 
Instance details

Defined in Amazonka.CloudFormation.ListStackSets

Eq ListStackSetsResponse 
Instance details

Defined in Amazonka.CloudFormation.ListStackSets

Eq ListStacks 
Instance details

Defined in Amazonka.CloudFormation.ListStacks

Eq ListStacksResponse 
Instance details

Defined in Amazonka.CloudFormation.ListStacks

Eq ListTypeRegistrations 
Instance details

Defined in Amazonka.CloudFormation.ListTypeRegistrations

Eq ListTypeRegistrationsResponse 
Instance details

Defined in Amazonka.CloudFormation.ListTypeRegistrations

Eq ListTypeVersions 
Instance details

Defined in Amazonka.CloudFormation.ListTypeVersions

Eq ListTypeVersionsResponse 
Instance details

Defined in Amazonka.CloudFormation.ListTypeVersions

Eq ListTypes 
Instance details

Defined in Amazonka.CloudFormation.ListTypes

Eq ListTypesResponse 
Instance details

Defined in Amazonka.CloudFormation.ListTypes

Eq PublishType 
Instance details

Defined in Amazonka.CloudFormation.PublishType

Eq PublishTypeResponse 
Instance details

Defined in Amazonka.CloudFormation.PublishType

Eq RecordHandlerProgress 
Instance details

Defined in Amazonka.CloudFormation.RecordHandlerProgress

Eq RecordHandlerProgressResponse 
Instance details

Defined in Amazonka.CloudFormation.RecordHandlerProgress

Eq RegisterPublisher 
Instance details

Defined in Amazonka.CloudFormation.RegisterPublisher

Eq RegisterPublisherResponse 
Instance details

Defined in Amazonka.CloudFormation.RegisterPublisher

Eq RegisterType 
Instance details

Defined in Amazonka.CloudFormation.RegisterType

Eq RegisterTypeResponse 
Instance details

Defined in Amazonka.CloudFormation.RegisterType

Eq RollbackStack 
Instance details

Defined in Amazonka.CloudFormation.RollbackStack

Eq RollbackStackResponse 
Instance details

Defined in Amazonka.CloudFormation.RollbackStack

Eq SetStackPolicy 
Instance details

Defined in Amazonka.CloudFormation.SetStackPolicy

Eq SetStackPolicyResponse 
Instance details

Defined in Amazonka.CloudFormation.SetStackPolicy

Eq SetTypeConfiguration 
Instance details

Defined in Amazonka.CloudFormation.SetTypeConfiguration

Eq SetTypeConfigurationResponse 
Instance details

Defined in Amazonka.CloudFormation.SetTypeConfiguration

Eq SetTypeDefaultVersion 
Instance details

Defined in Amazonka.CloudFormation.SetTypeDefaultVersion

Eq SetTypeDefaultVersionResponse 
Instance details

Defined in Amazonka.CloudFormation.SetTypeDefaultVersion

Eq SignalResource 
Instance details

Defined in Amazonka.CloudFormation.SignalResource

Eq SignalResourceResponse 
Instance details

Defined in Amazonka.CloudFormation.SignalResource

Eq StopStackSetOperation 
Instance details

Defined in Amazonka.CloudFormation.StopStackSetOperation

Eq StopStackSetOperationResponse 
Instance details

Defined in Amazonka.CloudFormation.StopStackSetOperation

Eq TestType 
Instance details

Defined in Amazonka.CloudFormation.TestType

Eq TestTypeResponse 
Instance details

Defined in Amazonka.CloudFormation.TestType

Eq AccountFilterType 
Instance details

Defined in Amazonka.CloudFormation.Types.AccountFilterType

Eq AccountGateResult 
Instance details

Defined in Amazonka.CloudFormation.Types.AccountGateResult

Eq AccountGateStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.AccountGateStatus

Eq AccountLimit 
Instance details

Defined in Amazonka.CloudFormation.Types.AccountLimit

Eq AutoDeployment 
Instance details

Defined in Amazonka.CloudFormation.Types.AutoDeployment

Eq BatchDescribeTypeConfigurationsError 
Instance details

Defined in Amazonka.CloudFormation.Types.BatchDescribeTypeConfigurationsError

Eq CallAs 
Instance details

Defined in Amazonka.CloudFormation.Types.CallAs

Methods

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

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

Eq Capability 
Instance details

Defined in Amazonka.CloudFormation.Types.Capability

Eq Category 
Instance details

Defined in Amazonka.CloudFormation.Types.Category

Eq Change 
Instance details

Defined in Amazonka.CloudFormation.Types.Change

Methods

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

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

Eq ChangeAction 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeAction

Eq ChangeSetHook 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetHook

Eq ChangeSetHookResourceTargetDetails 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetHookResourceTargetDetails

Eq ChangeSetHookTargetDetails 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetHookTargetDetails

Eq ChangeSetHooksStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetHooksStatus

Eq ChangeSetStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetStatus

Eq ChangeSetSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetSummary

Eq ChangeSetType 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetType

Eq ChangeSource 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSource

Eq ChangeType 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeType

Eq DeploymentTargets 
Instance details

Defined in Amazonka.CloudFormation.Types.DeploymentTargets

Eq DeprecatedStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.DeprecatedStatus

Eq DifferenceType 
Instance details

Defined in Amazonka.CloudFormation.Types.DifferenceType

Eq EvaluationType 
Instance details

Defined in Amazonka.CloudFormation.Types.EvaluationType

Eq ExecutionStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.ExecutionStatus

Eq Export 
Instance details

Defined in Amazonka.CloudFormation.Types.Export

Methods

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

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

Eq HandlerErrorCode 
Instance details

Defined in Amazonka.CloudFormation.Types.HandlerErrorCode

Eq HookFailureMode 
Instance details

Defined in Amazonka.CloudFormation.Types.HookFailureMode

Eq HookInvocationPoint 
Instance details

Defined in Amazonka.CloudFormation.Types.HookInvocationPoint

Eq HookStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.HookStatus

Eq HookTargetType 
Instance details

Defined in Amazonka.CloudFormation.Types.HookTargetType

Eq IdentityProvider 
Instance details

Defined in Amazonka.CloudFormation.Types.IdentityProvider

Eq LoggingConfig 
Instance details

Defined in Amazonka.CloudFormation.Types.LoggingConfig

Eq ManagedExecution 
Instance details

Defined in Amazonka.CloudFormation.Types.ManagedExecution

Eq ModuleInfo 
Instance details

Defined in Amazonka.CloudFormation.Types.ModuleInfo

Eq OnFailure 
Instance details

Defined in Amazonka.CloudFormation.Types.OnFailure

Eq OperationResultFilter 
Instance details

Defined in Amazonka.CloudFormation.Types.OperationResultFilter

Eq OperationResultFilterName 
Instance details

Defined in Amazonka.CloudFormation.Types.OperationResultFilterName

Eq OperationStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.OperationStatus

Eq Output 
Instance details

Defined in Amazonka.CloudFormation.Types.Output

Methods

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

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

Eq Parameter 
Instance details

Defined in Amazonka.CloudFormation.Types.Parameter

Eq ParameterConstraints 
Instance details

Defined in Amazonka.CloudFormation.Types.ParameterConstraints

Eq ParameterDeclaration 
Instance details

Defined in Amazonka.CloudFormation.Types.ParameterDeclaration

Eq PermissionModels 
Instance details

Defined in Amazonka.CloudFormation.Types.PermissionModels

Eq PhysicalResourceIdContextKeyValuePair 
Instance details

Defined in Amazonka.CloudFormation.Types.PhysicalResourceIdContextKeyValuePair

Eq PropertyDifference 
Instance details

Defined in Amazonka.CloudFormation.Types.PropertyDifference

Eq ProvisioningType 
Instance details

Defined in Amazonka.CloudFormation.Types.ProvisioningType

Eq PublisherStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.PublisherStatus

Eq RegionConcurrencyType 
Instance details

Defined in Amazonka.CloudFormation.Types.RegionConcurrencyType

Eq RegistrationStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.RegistrationStatus

Eq RegistryType 
Instance details

Defined in Amazonka.CloudFormation.Types.RegistryType

Eq Replacement 
Instance details

Defined in Amazonka.CloudFormation.Types.Replacement

Eq RequiredActivatedType 
Instance details

Defined in Amazonka.CloudFormation.Types.RequiredActivatedType

Eq RequiresRecreation 
Instance details

Defined in Amazonka.CloudFormation.Types.RequiresRecreation

Eq ResourceAttribute 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceAttribute

Eq ResourceChange 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceChange

Eq ResourceChangeDetail 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceChangeDetail

Eq ResourceIdentifierSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceIdentifierSummary

Eq ResourceSignalStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceSignalStatus

Eq ResourceStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceStatus

Eq ResourceTargetDefinition 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceTargetDefinition

Eq ResourceToImport 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceToImport

Eq RollbackConfiguration 
Instance details

Defined in Amazonka.CloudFormation.Types.RollbackConfiguration

Eq RollbackTrigger 
Instance details

Defined in Amazonka.CloudFormation.Types.RollbackTrigger

Eq Stack 
Instance details

Defined in Amazonka.CloudFormation.Types.Stack

Methods

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

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

Eq StackDriftDetectionStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackDriftDetectionStatus

Eq StackDriftInformation 
Instance details

Defined in Amazonka.CloudFormation.Types.StackDriftInformation

Eq StackDriftInformationSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackDriftInformationSummary

Eq StackDriftStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackDriftStatus

Eq StackEvent 
Instance details

Defined in Amazonka.CloudFormation.Types.StackEvent

Eq StackInstance 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstance

Eq StackInstanceComprehensiveStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstanceComprehensiveStatus

Eq StackInstanceDetailedStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstanceDetailedStatus

Eq StackInstanceFilter 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstanceFilter

Eq StackInstanceFilterName 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstanceFilterName

Eq StackInstanceStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstanceStatus

Eq StackInstanceSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstanceSummary

Eq StackResource 
Instance details

Defined in Amazonka.CloudFormation.Types.StackResource

Eq StackResourceDetail 
Instance details

Defined in Amazonka.CloudFormation.Types.StackResourceDetail

Eq StackResourceDrift 
Instance details

Defined in Amazonka.CloudFormation.Types.StackResourceDrift

Eq StackResourceDriftInformation 
Instance details

Defined in Amazonka.CloudFormation.Types.StackResourceDriftInformation

Eq StackResourceDriftInformationSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackResourceDriftInformationSummary

Eq StackResourceDriftStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackResourceDriftStatus

Eq StackResourceSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackResourceSummary

Eq StackSet 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSet

Eq StackSetDriftDetectionDetails 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetDriftDetectionDetails

Eq StackSetDriftDetectionStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetDriftDetectionStatus

Eq StackSetDriftStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetDriftStatus

Eq StackSetOperation 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperation

Eq StackSetOperationAction 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationAction

Eq StackSetOperationPreferences 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationPreferences

Eq StackSetOperationResultStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationResultStatus

Eq StackSetOperationResultSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationResultSummary

Eq StackSetOperationStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationStatus

Eq StackSetOperationStatusDetails 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationStatusDetails

Eq StackSetOperationSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationSummary

Eq StackSetStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetStatus

Eq StackSetSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetSummary

Eq StackStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackStatus

Eq StackSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSummary

Eq Tag 
Instance details

Defined in Amazonka.CloudFormation.Types.Tag

Methods

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

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

Eq TemplateParameter 
Instance details

Defined in Amazonka.CloudFormation.Types.TemplateParameter

Eq TemplateStage 
Instance details

Defined in Amazonka.CloudFormation.Types.TemplateStage

Eq ThirdPartyType 
Instance details

Defined in Amazonka.CloudFormation.Types.ThirdPartyType

Eq TypeConfigurationDetails 
Instance details

Defined in Amazonka.CloudFormation.Types.TypeConfigurationDetails

Eq TypeConfigurationIdentifier 
Instance details

Defined in Amazonka.CloudFormation.Types.TypeConfigurationIdentifier

Eq TypeFilters 
Instance details

Defined in Amazonka.CloudFormation.Types.TypeFilters

Eq TypeSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.TypeSummary

Eq TypeTestsStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.TypeTestsStatus

Eq TypeVersionSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.TypeVersionSummary

Eq VersionBump 
Instance details

Defined in Amazonka.CloudFormation.Types.VersionBump

Eq Visibility 
Instance details

Defined in Amazonka.CloudFormation.Types.Visibility

Eq UpdateStack 
Instance details

Defined in Amazonka.CloudFormation.UpdateStack

Eq UpdateStackResponse 
Instance details

Defined in Amazonka.CloudFormation.UpdateStack

Eq UpdateStackInstances 
Instance details

Defined in Amazonka.CloudFormation.UpdateStackInstances

Eq UpdateStackInstancesResponse 
Instance details

Defined in Amazonka.CloudFormation.UpdateStackInstances

Eq UpdateStackSet 
Instance details

Defined in Amazonka.CloudFormation.UpdateStackSet

Eq UpdateStackSetResponse 
Instance details

Defined in Amazonka.CloudFormation.UpdateStackSet

Eq UpdateTerminationProtection 
Instance details

Defined in Amazonka.CloudFormation.UpdateTerminationProtection

Eq UpdateTerminationProtectionResponse 
Instance details

Defined in Amazonka.CloudFormation.UpdateTerminationProtection

Eq ValidateTemplate 
Instance details

Defined in Amazonka.CloudFormation.ValidateTemplate

Eq ValidateTemplateResponse 
Instance details

Defined in Amazonka.CloudFormation.ValidateTemplate

Eq Base64 
Instance details

Defined in Amazonka.Data.Base64

Methods

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

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

Eq ChunkSize 
Instance details

Defined in Amazonka.Data.Body

Eq Encoding 
Instance details

Defined in Amazonka.Data.Path

Methods

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

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

Eq TwiceEscapedPath 
Instance details

Defined in Amazonka.Data.Path

Eq QueryString 
Instance details

Defined in Amazonka.Data.Query

Eq Format 
Instance details

Defined in Amazonka.Data.Time

Methods

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

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

Eq Abbrev 
Instance details

Defined in Amazonka.Types

Methods

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

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

Eq AccessKey 
Instance details

Defined in Amazonka.Types

Eq AuthEnv 
Instance details

Defined in Amazonka.Types

Methods

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

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

Eq Endpoint 
Instance details

Defined in Amazonka.Types

Eq ErrorCode 
Instance details

Defined in Amazonka.Types

Eq ErrorMessage 
Instance details

Defined in Amazonka.Types

Eq Region 
Instance details

Defined in Amazonka.Types

Methods

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

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

Eq RequestId 
Instance details

Defined in Amazonka.Types

Eq S3AddressingStyle 
Instance details

Defined in Amazonka.Types

Eq Seconds 
Instance details

Defined in Amazonka.Types

Methods

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

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

Eq SecretKey 
Instance details

Defined in Amazonka.Types

Eq SerializeError 
Instance details

Defined in Amazonka.Types

Eq ServiceError 
Instance details

Defined in Amazonka.Types

Eq SessionToken 
Instance details

Defined in Amazonka.Types

Eq Accept 
Instance details

Defined in Amazonka.Waiter

Methods

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

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

Eq DescribeAvailabilityZones 
Instance details

Defined in Amazonka.EC2.DescribeAvailabilityZones

Eq DescribeAvailabilityZonesResponse 
Instance details

Defined in Amazonka.EC2.DescribeAvailabilityZones

Eq DeleteTag 
Instance details

Defined in Amazonka.EC2.Internal

Eq AcceleratorCount 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorCount

Eq AcceleratorCountRequest 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorCountRequest

Eq AcceleratorManufacturer 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorManufacturer

Eq AcceleratorName 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorName

Eq AcceleratorTotalMemoryMiB 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorTotalMemoryMiB

Eq AcceleratorTotalMemoryMiBRequest 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorTotalMemoryMiBRequest

Eq AcceleratorType 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorType

Eq AccessScopeAnalysisFinding 
Instance details

Defined in Amazonka.EC2.Types.AccessScopeAnalysisFinding

Eq AccessScopePath 
Instance details

Defined in Amazonka.EC2.Types.AccessScopePath

Eq AccessScopePathRequest 
Instance details

Defined in Amazonka.EC2.Types.AccessScopePathRequest

Eq AccountAttribute 
Instance details

Defined in Amazonka.EC2.Types.AccountAttribute

Eq AccountAttributeName 
Instance details

Defined in Amazonka.EC2.Types.AccountAttributeName

Eq AccountAttributeValue 
Instance details

Defined in Amazonka.EC2.Types.AccountAttributeValue

Eq ActiveInstance 
Instance details

Defined in Amazonka.EC2.Types.ActiveInstance

Eq ActivityStatus 
Instance details

Defined in Amazonka.EC2.Types.ActivityStatus

Eq AddIpamOperatingRegion 
Instance details

Defined in Amazonka.EC2.Types.AddIpamOperatingRegion

Eq AddPrefixListEntry 
Instance details

Defined in Amazonka.EC2.Types.AddPrefixListEntry

Eq AddedPrincipal 
Instance details

Defined in Amazonka.EC2.Types.AddedPrincipal

Eq AdditionalDetail 
Instance details

Defined in Amazonka.EC2.Types.AdditionalDetail

Eq Address 
Instance details

Defined in Amazonka.EC2.Types.Address

Methods

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

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

Eq AddressAttribute 
Instance details

Defined in Amazonka.EC2.Types.AddressAttribute

Eq AddressAttributeName 
Instance details

Defined in Amazonka.EC2.Types.AddressAttributeName

Eq AddressFamily 
Instance details

Defined in Amazonka.EC2.Types.AddressFamily

Eq AddressStatus 
Instance details

Defined in Amazonka.EC2.Types.AddressStatus

Eq AddressTransfer 
Instance details

Defined in Amazonka.EC2.Types.AddressTransfer

Eq AddressTransferStatus 
Instance details

Defined in Amazonka.EC2.Types.AddressTransferStatus

Eq Affinity 
Instance details

Defined in Amazonka.EC2.Types.Affinity

Eq AllocationState 
Instance details

Defined in Amazonka.EC2.Types.AllocationState

Eq AllocationStrategy 
Instance details

Defined in Amazonka.EC2.Types.AllocationStrategy

Eq AllocationType 
Instance details

Defined in Amazonka.EC2.Types.AllocationType

Eq AllowedPrincipal 
Instance details

Defined in Amazonka.EC2.Types.AllowedPrincipal

Eq AllowsMultipleInstanceTypes 
Instance details

Defined in Amazonka.EC2.Types.AllowsMultipleInstanceTypes

Eq AlternatePathHint 
Instance details

Defined in Amazonka.EC2.Types.AlternatePathHint

Eq AnalysisAclRule 
Instance details

Defined in Amazonka.EC2.Types.AnalysisAclRule

Eq AnalysisComponent 
Instance details

Defined in Amazonka.EC2.Types.AnalysisComponent

Eq AnalysisLoadBalancerListener 
Instance details

Defined in Amazonka.EC2.Types.AnalysisLoadBalancerListener

Eq AnalysisLoadBalancerTarget 
Instance details

Defined in Amazonka.EC2.Types.AnalysisLoadBalancerTarget

Eq AnalysisPacketHeader 
Instance details

Defined in Amazonka.EC2.Types.AnalysisPacketHeader

Eq AnalysisRouteTableRoute 
Instance details

Defined in Amazonka.EC2.Types.AnalysisRouteTableRoute

Eq AnalysisSecurityGroupRule 
Instance details

Defined in Amazonka.EC2.Types.AnalysisSecurityGroupRule

Eq AnalysisStatus 
Instance details

Defined in Amazonka.EC2.Types.AnalysisStatus

Eq ApplianceModeSupportValue 
Instance details

Defined in Amazonka.EC2.Types.ApplianceModeSupportValue

Eq ArchitectureType 
Instance details

Defined in Amazonka.EC2.Types.ArchitectureType

Eq ArchitectureValues 
Instance details

Defined in Amazonka.EC2.Types.ArchitectureValues

Eq AssignedPrivateIpAddress 
Instance details

Defined in Amazonka.EC2.Types.AssignedPrivateIpAddress

Eq AssociatedNetworkType 
Instance details

Defined in Amazonka.EC2.Types.AssociatedNetworkType

Eq AssociatedRole 
Instance details

Defined in Amazonka.EC2.Types.AssociatedRole

Eq AssociatedTargetNetwork 
Instance details

Defined in Amazonka.EC2.Types.AssociatedTargetNetwork

Eq AssociationStatus 
Instance details

Defined in Amazonka.EC2.Types.AssociationStatus

Eq AssociationStatusCode 
Instance details

Defined in Amazonka.EC2.Types.AssociationStatusCode

Eq AthenaIntegration 
Instance details

Defined in Amazonka.EC2.Types.AthenaIntegration

Eq AttachmentEnaSrdSpecification 
Instance details

Defined in Amazonka.EC2.Types.AttachmentEnaSrdSpecification

Eq AttachmentEnaSrdUdpSpecification 
Instance details

Defined in Amazonka.EC2.Types.AttachmentEnaSrdUdpSpecification

Eq AttachmentStatus 
Instance details

Defined in Amazonka.EC2.Types.AttachmentStatus

Eq AttributeBooleanValue 
Instance details

Defined in Amazonka.EC2.Types.AttributeBooleanValue

Eq AttributeValue 
Instance details

Defined in Amazonka.EC2.Types.AttributeValue

Eq AuthorizationRule 
Instance details

Defined in Amazonka.EC2.Types.AuthorizationRule

Eq AutoAcceptSharedAssociationsValue 
Instance details

Defined in Amazonka.EC2.Types.AutoAcceptSharedAssociationsValue

Eq AutoAcceptSharedAttachmentsValue 
Instance details

Defined in Amazonka.EC2.Types.AutoAcceptSharedAttachmentsValue

Eq AutoPlacement 
Instance details

Defined in Amazonka.EC2.Types.AutoPlacement

Eq AvailabilityZone 
Instance details

Defined in Amazonka.EC2.Types.AvailabilityZone

Eq AvailabilityZoneMessage 
Instance details

Defined in Amazonka.EC2.Types.AvailabilityZoneMessage

Eq AvailabilityZoneOptInStatus 
Instance details

Defined in Amazonka.EC2.Types.AvailabilityZoneOptInStatus

Eq AvailabilityZoneState 
Instance details

Defined in Amazonka.EC2.Types.AvailabilityZoneState

Eq AvailableCapacity 
Instance details

Defined in Amazonka.EC2.Types.AvailableCapacity

Eq BareMetal 
Instance details

Defined in Amazonka.EC2.Types.BareMetal

Eq BaselineEbsBandwidthMbps 
Instance details

Defined in Amazonka.EC2.Types.BaselineEbsBandwidthMbps

Eq BaselineEbsBandwidthMbpsRequest 
Instance details

Defined in Amazonka.EC2.Types.BaselineEbsBandwidthMbpsRequest

Eq BatchState 
Instance details

Defined in Amazonka.EC2.Types.BatchState

Eq BgpStatus 
Instance details

Defined in Amazonka.EC2.Types.BgpStatus

Eq BlobAttributeValue 
Instance details

Defined in Amazonka.EC2.Types.BlobAttributeValue

Eq BlockDeviceMapping 
Instance details

Defined in Amazonka.EC2.Types.BlockDeviceMapping

Eq BootModeType 
Instance details

Defined in Amazonka.EC2.Types.BootModeType

Eq BootModeValues 
Instance details

Defined in Amazonka.EC2.Types.BootModeValues

Eq BundleTask 
Instance details

Defined in Amazonka.EC2.Types.BundleTask

Eq BundleTaskError 
Instance details

Defined in Amazonka.EC2.Types.BundleTaskError

Eq BundleTaskState 
Instance details

Defined in Amazonka.EC2.Types.BundleTaskState

Eq BurstablePerformance 
Instance details

Defined in Amazonka.EC2.Types.BurstablePerformance

Eq ByoipCidr 
Instance details

Defined in Amazonka.EC2.Types.ByoipCidr

Eq ByoipCidrState 
Instance details

Defined in Amazonka.EC2.Types.ByoipCidrState

Eq CancelBatchErrorCode 
Instance details

Defined in Amazonka.EC2.Types.CancelBatchErrorCode

Eq CancelCapacityReservationFleetError 
Instance details

Defined in Amazonka.EC2.Types.CancelCapacityReservationFleetError

Eq CancelSpotFleetRequestsError 
Instance details

Defined in Amazonka.EC2.Types.CancelSpotFleetRequestsError

Eq CancelSpotFleetRequestsErrorItem 
Instance details

Defined in Amazonka.EC2.Types.CancelSpotFleetRequestsErrorItem

Eq CancelSpotFleetRequestsSuccessItem 
Instance details

Defined in Amazonka.EC2.Types.CancelSpotFleetRequestsSuccessItem

Eq CancelSpotInstanceRequestState 
Instance details

Defined in Amazonka.EC2.Types.CancelSpotInstanceRequestState

Eq CancelledSpotInstanceRequest 
Instance details

Defined in Amazonka.EC2.Types.CancelledSpotInstanceRequest

Eq CapacityAllocation 
Instance details

Defined in Amazonka.EC2.Types.CapacityAllocation

Eq CapacityReservation 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservation

Eq CapacityReservationFleet 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationFleet

Eq CapacityReservationFleetCancellationState 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationFleetCancellationState

Eq CapacityReservationFleetState 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationFleetState

Eq CapacityReservationGroup 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationGroup

Eq CapacityReservationInstancePlatform 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationInstancePlatform

Eq CapacityReservationOptions 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationOptions

Eq CapacityReservationOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationOptionsRequest

Eq CapacityReservationPreference 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationPreference

Eq CapacityReservationSpecification 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationSpecification

Eq CapacityReservationSpecificationResponse 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationSpecificationResponse

Eq CapacityReservationState 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationState

Eq CapacityReservationTarget 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationTarget

Eq CapacityReservationTargetResponse 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationTargetResponse

Eq CapacityReservationTenancy 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationTenancy

Eq CarrierGateway 
Instance details

Defined in Amazonka.EC2.Types.CarrierGateway

Eq CarrierGatewayState 
Instance details

Defined in Amazonka.EC2.Types.CarrierGatewayState

Eq CertificateAuthentication 
Instance details

Defined in Amazonka.EC2.Types.CertificateAuthentication

Eq CertificateAuthenticationRequest 
Instance details

Defined in Amazonka.EC2.Types.CertificateAuthenticationRequest

Eq CidrAuthorizationContext 
Instance details

Defined in Amazonka.EC2.Types.CidrAuthorizationContext

Eq CidrBlock 
Instance details

Defined in Amazonka.EC2.Types.CidrBlock

Eq ClassicLinkDnsSupport 
Instance details

Defined in Amazonka.EC2.Types.ClassicLinkDnsSupport

Eq ClassicLinkInstance 
Instance details

Defined in Amazonka.EC2.Types.ClassicLinkInstance

Eq ClassicLoadBalancer 
Instance details

Defined in Amazonka.EC2.Types.ClassicLoadBalancer

Eq ClassicLoadBalancersConfig 
Instance details

Defined in Amazonka.EC2.Types.ClassicLoadBalancersConfig

Eq ClientCertificateRevocationListStatus 
Instance details

Defined in Amazonka.EC2.Types.ClientCertificateRevocationListStatus

Eq ClientCertificateRevocationListStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientCertificateRevocationListStatusCode

Eq ClientConnectOptions 
Instance details

Defined in Amazonka.EC2.Types.ClientConnectOptions

Eq ClientConnectResponseOptions 
Instance details

Defined in Amazonka.EC2.Types.ClientConnectResponseOptions

Eq ClientData 
Instance details

Defined in Amazonka.EC2.Types.ClientData

Eq ClientLoginBannerOptions 
Instance details

Defined in Amazonka.EC2.Types.ClientLoginBannerOptions

Eq ClientLoginBannerResponseOptions 
Instance details

Defined in Amazonka.EC2.Types.ClientLoginBannerResponseOptions

Eq ClientVpnAuthentication 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnAuthentication

Eq ClientVpnAuthenticationRequest 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnAuthenticationRequest

Eq ClientVpnAuthenticationType 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnAuthenticationType

Eq ClientVpnAuthorizationRuleStatus 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnAuthorizationRuleStatus

Eq ClientVpnAuthorizationRuleStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnAuthorizationRuleStatusCode

Eq ClientVpnConnection 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnConnection

Eq ClientVpnConnectionStatus 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnConnectionStatus

Eq ClientVpnConnectionStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnConnectionStatusCode

Eq ClientVpnEndpoint 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnEndpoint

Eq ClientVpnEndpointAttributeStatus 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnEndpointAttributeStatus

Eq ClientVpnEndpointAttributeStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnEndpointAttributeStatusCode

Eq ClientVpnEndpointStatus 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnEndpointStatus

Eq ClientVpnEndpointStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnEndpointStatusCode

Eq ClientVpnRoute 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnRoute

Eq ClientVpnRouteStatus 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnRouteStatus

Eq ClientVpnRouteStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnRouteStatusCode

Eq CloudWatchLogOptions 
Instance details

Defined in Amazonka.EC2.Types.CloudWatchLogOptions

Eq CloudWatchLogOptionsSpecification 
Instance details

Defined in Amazonka.EC2.Types.CloudWatchLogOptionsSpecification

Eq CoipAddressUsage 
Instance details

Defined in Amazonka.EC2.Types.CoipAddressUsage

Eq CoipCidr 
Instance details

Defined in Amazonka.EC2.Types.CoipCidr

Eq CoipPool 
Instance details

Defined in Amazonka.EC2.Types.CoipPool

Eq ConnectionLogOptions 
Instance details

Defined in Amazonka.EC2.Types.ConnectionLogOptions

Eq ConnectionLogResponseOptions 
Instance details

Defined in Amazonka.EC2.Types.ConnectionLogResponseOptions

Eq ConnectionNotification 
Instance details

Defined in Amazonka.EC2.Types.ConnectionNotification

Eq ConnectionNotificationState 
Instance details

Defined in Amazonka.EC2.Types.ConnectionNotificationState

Eq ConnectionNotificationType 
Instance details

Defined in Amazonka.EC2.Types.ConnectionNotificationType

Eq ConnectivityType 
Instance details

Defined in Amazonka.EC2.Types.ConnectivityType

Eq ContainerFormat 
Instance details

Defined in Amazonka.EC2.Types.ContainerFormat

Eq ConversionTask 
Instance details

Defined in Amazonka.EC2.Types.ConversionTask

Eq ConversionTaskState 
Instance details

Defined in Amazonka.EC2.Types.ConversionTaskState

Eq CopyTagsFromSource 
Instance details

Defined in Amazonka.EC2.Types.CopyTagsFromSource

Eq CpuManufacturer 
Instance details

Defined in Amazonka.EC2.Types.CpuManufacturer

Eq CpuOptions 
Instance details

Defined in Amazonka.EC2.Types.CpuOptions

Eq CpuOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.CpuOptionsRequest

Eq CreateFleetError 
Instance details

Defined in Amazonka.EC2.Types.CreateFleetError

Eq CreateFleetInstance 
Instance details

Defined in Amazonka.EC2.Types.CreateFleetInstance

Eq CreateTransitGatewayConnectRequestOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateTransitGatewayConnectRequestOptions

Eq CreateTransitGatewayMulticastDomainRequestOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateTransitGatewayMulticastDomainRequestOptions

Eq CreateTransitGatewayPeeringAttachmentRequestOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateTransitGatewayPeeringAttachmentRequestOptions

Eq CreateTransitGatewayVpcAttachmentRequestOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateTransitGatewayVpcAttachmentRequestOptions

Eq CreateVerifiedAccessEndpointEniOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateVerifiedAccessEndpointEniOptions

Eq CreateVerifiedAccessEndpointLoadBalancerOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateVerifiedAccessEndpointLoadBalancerOptions

Eq CreateVerifiedAccessTrustProviderDeviceOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateVerifiedAccessTrustProviderDeviceOptions

Eq CreateVerifiedAccessTrustProviderOidcOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateVerifiedAccessTrustProviderOidcOptions

Eq CreateVolumePermission 
Instance details

Defined in Amazonka.EC2.Types.CreateVolumePermission

Eq CreateVolumePermissionModifications 
Instance details

Defined in Amazonka.EC2.Types.CreateVolumePermissionModifications

Eq CreditSpecification 
Instance details

Defined in Amazonka.EC2.Types.CreditSpecification

Eq CreditSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.CreditSpecificationRequest

Eq CurrencyCodeValues 
Instance details

Defined in Amazonka.EC2.Types.CurrencyCodeValues

Eq CustomerGateway 
Instance details

Defined in Amazonka.EC2.Types.CustomerGateway

Eq DataQuery 
Instance details

Defined in Amazonka.EC2.Types.DataQuery

Eq DataResponse 
Instance details

Defined in Amazonka.EC2.Types.DataResponse

Eq DatafeedSubscriptionState 
Instance details

Defined in Amazonka.EC2.Types.DatafeedSubscriptionState

Eq DefaultRouteTableAssociationValue 
Instance details

Defined in Amazonka.EC2.Types.DefaultRouteTableAssociationValue

Eq DefaultRouteTablePropagationValue 
Instance details

Defined in Amazonka.EC2.Types.DefaultRouteTablePropagationValue

Eq DefaultTargetCapacityType 
Instance details

Defined in Amazonka.EC2.Types.DefaultTargetCapacityType

Eq DeleteFleetError 
Instance details

Defined in Amazonka.EC2.Types.DeleteFleetError

Eq DeleteFleetErrorCode 
Instance details

Defined in Amazonka.EC2.Types.DeleteFleetErrorCode

Eq DeleteFleetErrorItem 
Instance details

Defined in Amazonka.EC2.Types.DeleteFleetErrorItem

Eq DeleteFleetSuccessItem 
Instance details

Defined in Amazonka.EC2.Types.DeleteFleetSuccessItem

Eq DeleteLaunchTemplateVersionsResponseErrorItem 
Instance details

Defined in Amazonka.EC2.Types.DeleteLaunchTemplateVersionsResponseErrorItem

Eq DeleteLaunchTemplateVersionsResponseSuccessItem 
Instance details

Defined in Amazonka.EC2.Types.DeleteLaunchTemplateVersionsResponseSuccessItem

Eq DeleteQueuedReservedInstancesError 
Instance details

Defined in Amazonka.EC2.Types.DeleteQueuedReservedInstancesError

Eq DeleteQueuedReservedInstancesErrorCode 
Instance details

Defined in Amazonka.EC2.Types.DeleteQueuedReservedInstancesErrorCode

Eq DeregisterInstanceTagAttributeRequest 
Instance details

Defined in Amazonka.EC2.Types.DeregisterInstanceTagAttributeRequest

Eq DescribeFastLaunchImagesSuccessItem 
Instance details

Defined in Amazonka.EC2.Types.DescribeFastLaunchImagesSuccessItem

Eq DescribeFastSnapshotRestoreSuccessItem 
Instance details

Defined in Amazonka.EC2.Types.DescribeFastSnapshotRestoreSuccessItem

Eq DescribeFleetError 
Instance details

Defined in Amazonka.EC2.Types.DescribeFleetError

Eq DescribeFleetsInstances 
Instance details

Defined in Amazonka.EC2.Types.DescribeFleetsInstances

Eq DestinationFileFormat 
Instance details

Defined in Amazonka.EC2.Types.DestinationFileFormat

Eq DestinationOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.DestinationOptionsRequest

Eq DestinationOptionsResponse 
Instance details

Defined in Amazonka.EC2.Types.DestinationOptionsResponse

Eq DeviceOptions 
Instance details

Defined in Amazonka.EC2.Types.DeviceOptions

Eq DeviceTrustProviderType 
Instance details

Defined in Amazonka.EC2.Types.DeviceTrustProviderType

Eq DeviceType 
Instance details

Defined in Amazonka.EC2.Types.DeviceType

Eq DhcpConfiguration 
Instance details

Defined in Amazonka.EC2.Types.DhcpConfiguration

Eq DhcpOptions 
Instance details

Defined in Amazonka.EC2.Types.DhcpOptions

Eq DirectoryServiceAuthentication 
Instance details

Defined in Amazonka.EC2.Types.DirectoryServiceAuthentication

Eq DirectoryServiceAuthenticationRequest 
Instance details

Defined in Amazonka.EC2.Types.DirectoryServiceAuthenticationRequest

Eq DisableFastSnapshotRestoreErrorItem 
Instance details

Defined in Amazonka.EC2.Types.DisableFastSnapshotRestoreErrorItem

Eq DisableFastSnapshotRestoreStateError 
Instance details

Defined in Amazonka.EC2.Types.DisableFastSnapshotRestoreStateError

Eq DisableFastSnapshotRestoreStateErrorItem 
Instance details

Defined in Amazonka.EC2.Types.DisableFastSnapshotRestoreStateErrorItem

Eq DisableFastSnapshotRestoreSuccessItem 
Instance details

Defined in Amazonka.EC2.Types.DisableFastSnapshotRestoreSuccessItem

Eq DiskImage 
Instance details

Defined in Amazonka.EC2.Types.DiskImage

Eq DiskImageDescription 
Instance details

Defined in Amazonka.EC2.Types.DiskImageDescription

Eq DiskImageDetail 
Instance details

Defined in Amazonka.EC2.Types.DiskImageDetail

Eq DiskImageFormat 
Instance details

Defined in Amazonka.EC2.Types.DiskImageFormat

Eq DiskImageVolumeDescription 
Instance details

Defined in Amazonka.EC2.Types.DiskImageVolumeDescription

Eq DiskInfo 
Instance details

Defined in Amazonka.EC2.Types.DiskInfo

Eq DiskType 
Instance details

Defined in Amazonka.EC2.Types.DiskType

Eq DnsEntry 
Instance details

Defined in Amazonka.EC2.Types.DnsEntry

Eq DnsNameState 
Instance details

Defined in Amazonka.EC2.Types.DnsNameState

Eq DnsOptions 
Instance details

Defined in Amazonka.EC2.Types.DnsOptions

Eq DnsOptionsSpecification 
Instance details

Defined in Amazonka.EC2.Types.DnsOptionsSpecification

Eq DnsRecordIpType 
Instance details

Defined in Amazonka.EC2.Types.DnsRecordIpType

Eq DnsServersOptionsModifyStructure 
Instance details

Defined in Amazonka.EC2.Types.DnsServersOptionsModifyStructure

Eq DnsSupportValue 
Instance details

Defined in Amazonka.EC2.Types.DnsSupportValue

Eq DomainType 
Instance details

Defined in Amazonka.EC2.Types.DomainType

Eq DynamicRoutingValue 
Instance details

Defined in Amazonka.EC2.Types.DynamicRoutingValue

Eq EbsBlockDevice 
Instance details

Defined in Amazonka.EC2.Types.EbsBlockDevice

Eq EbsEncryptionSupport 
Instance details

Defined in Amazonka.EC2.Types.EbsEncryptionSupport

Eq EbsInfo 
Instance details

Defined in Amazonka.EC2.Types.EbsInfo

Methods

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

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

Eq EbsInstanceBlockDevice 
Instance details

Defined in Amazonka.EC2.Types.EbsInstanceBlockDevice

Eq EbsInstanceBlockDeviceSpecification 
Instance details

Defined in Amazonka.EC2.Types.EbsInstanceBlockDeviceSpecification

Eq EbsNvmeSupport 
Instance details

Defined in Amazonka.EC2.Types.EbsNvmeSupport

Eq EbsOptimizedInfo 
Instance details

Defined in Amazonka.EC2.Types.EbsOptimizedInfo

Eq EbsOptimizedSupport 
Instance details

Defined in Amazonka.EC2.Types.EbsOptimizedSupport

Eq EfaInfo 
Instance details

Defined in Amazonka.EC2.Types.EfaInfo

Methods

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

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

Eq EgressOnlyInternetGateway 
Instance details

Defined in Amazonka.EC2.Types.EgressOnlyInternetGateway

Eq ElasticGpuAssociation 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpuAssociation

Eq ElasticGpuHealth 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpuHealth

Eq ElasticGpuSpecification 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpuSpecification

Eq ElasticGpuSpecificationResponse 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpuSpecificationResponse

Eq ElasticGpuState 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpuState

Eq ElasticGpuStatus 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpuStatus

Eq ElasticGpus 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpus

Eq ElasticInferenceAccelerator 
Instance details

Defined in Amazonka.EC2.Types.ElasticInferenceAccelerator

Eq ElasticInferenceAcceleratorAssociation 
Instance details

Defined in Amazonka.EC2.Types.ElasticInferenceAcceleratorAssociation

Eq EnaSrdSpecification 
Instance details

Defined in Amazonka.EC2.Types.EnaSrdSpecification

Eq EnaSrdUdpSpecification 
Instance details

Defined in Amazonka.EC2.Types.EnaSrdUdpSpecification

Eq EnaSupport 
Instance details

Defined in Amazonka.EC2.Types.EnaSupport

Eq EnableFastSnapshotRestoreErrorItem 
Instance details

Defined in Amazonka.EC2.Types.EnableFastSnapshotRestoreErrorItem

Eq EnableFastSnapshotRestoreStateError 
Instance details

Defined in Amazonka.EC2.Types.EnableFastSnapshotRestoreStateError

Eq EnableFastSnapshotRestoreStateErrorItem 
Instance details

Defined in Amazonka.EC2.Types.EnableFastSnapshotRestoreStateErrorItem

Eq EnableFastSnapshotRestoreSuccessItem 
Instance details

Defined in Amazonka.EC2.Types.EnableFastSnapshotRestoreSuccessItem

Eq EnclaveOptions 
Instance details

Defined in Amazonka.EC2.Types.EnclaveOptions

Eq EnclaveOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.EnclaveOptionsRequest

Eq EndDateType 
Instance details

Defined in Amazonka.EC2.Types.EndDateType

Eq EphemeralNvmeSupport 
Instance details

Defined in Amazonka.EC2.Types.EphemeralNvmeSupport

Eq EventCode 
Instance details

Defined in Amazonka.EC2.Types.EventCode

Eq EventInformation 
Instance details

Defined in Amazonka.EC2.Types.EventInformation

Eq EventType 
Instance details

Defined in Amazonka.EC2.Types.EventType

Eq ExcessCapacityTerminationPolicy 
Instance details

Defined in Amazonka.EC2.Types.ExcessCapacityTerminationPolicy

Eq Explanation 
Instance details

Defined in Amazonka.EC2.Types.Explanation

Eq ExportEnvironment 
Instance details

Defined in Amazonka.EC2.Types.ExportEnvironment

Eq ExportImageTask 
Instance details

Defined in Amazonka.EC2.Types.ExportImageTask

Eq ExportTask 
Instance details

Defined in Amazonka.EC2.Types.ExportTask

Eq ExportTaskS3Location 
Instance details

Defined in Amazonka.EC2.Types.ExportTaskS3Location

Eq ExportTaskS3LocationRequest 
Instance details

Defined in Amazonka.EC2.Types.ExportTaskS3LocationRequest

Eq ExportTaskState 
Instance details

Defined in Amazonka.EC2.Types.ExportTaskState

Eq ExportToS3Task 
Instance details

Defined in Amazonka.EC2.Types.ExportToS3Task

Eq ExportToS3TaskSpecification 
Instance details

Defined in Amazonka.EC2.Types.ExportToS3TaskSpecification

Eq FailedCapacityReservationFleetCancellationResult 
Instance details

Defined in Amazonka.EC2.Types.FailedCapacityReservationFleetCancellationResult

Eq FailedQueuedPurchaseDeletion 
Instance details

Defined in Amazonka.EC2.Types.FailedQueuedPurchaseDeletion

Eq FastLaunchLaunchTemplateSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.FastLaunchLaunchTemplateSpecificationRequest

Eq FastLaunchLaunchTemplateSpecificationResponse 
Instance details

Defined in Amazonka.EC2.Types.FastLaunchLaunchTemplateSpecificationResponse

Eq FastLaunchResourceType 
Instance details

Defined in Amazonka.EC2.Types.FastLaunchResourceType

Eq FastLaunchSnapshotConfigurationRequest 
Instance details

Defined in Amazonka.EC2.Types.FastLaunchSnapshotConfigurationRequest

Eq FastLaunchSnapshotConfigurationResponse 
Instance details

Defined in Amazonka.EC2.Types.FastLaunchSnapshotConfigurationResponse

Eq FastLaunchStateCode 
Instance details

Defined in Amazonka.EC2.Types.FastLaunchStateCode

Eq FastSnapshotRestoreStateCode 
Instance details

Defined in Amazonka.EC2.Types.FastSnapshotRestoreStateCode

Eq FederatedAuthentication 
Instance details

Defined in Amazonka.EC2.Types.FederatedAuthentication

Eq FederatedAuthenticationRequest 
Instance details

Defined in Amazonka.EC2.Types.FederatedAuthenticationRequest

Eq Filter 
Instance details

Defined in Amazonka.EC2.Types.Filter

Methods

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

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

Eq FindingsFound 
Instance details

Defined in Amazonka.EC2.Types.FindingsFound

Eq FleetActivityStatus 
Instance details

Defined in Amazonka.EC2.Types.FleetActivityStatus

Eq FleetCapacityReservation 
Instance details

Defined in Amazonka.EC2.Types.FleetCapacityReservation

Eq FleetCapacityReservationTenancy 
Instance details

Defined in Amazonka.EC2.Types.FleetCapacityReservationTenancy

Eq FleetCapacityReservationUsageStrategy 
Instance details

Defined in Amazonka.EC2.Types.FleetCapacityReservationUsageStrategy

Eq FleetData 
Instance details

Defined in Amazonka.EC2.Types.FleetData

Eq FleetEventType 
Instance details

Defined in Amazonka.EC2.Types.FleetEventType

Eq FleetExcessCapacityTerminationPolicy 
Instance details

Defined in Amazonka.EC2.Types.FleetExcessCapacityTerminationPolicy

Eq FleetInstanceMatchCriteria 
Instance details

Defined in Amazonka.EC2.Types.FleetInstanceMatchCriteria

Eq FleetLaunchTemplateConfig 
Instance details

Defined in Amazonka.EC2.Types.FleetLaunchTemplateConfig

Eq FleetLaunchTemplateConfigRequest 
Instance details

Defined in Amazonka.EC2.Types.FleetLaunchTemplateConfigRequest

Eq FleetLaunchTemplateOverrides 
Instance details

Defined in Amazonka.EC2.Types.FleetLaunchTemplateOverrides

Eq FleetLaunchTemplateOverridesRequest 
Instance details

Defined in Amazonka.EC2.Types.FleetLaunchTemplateOverridesRequest

Eq FleetLaunchTemplateSpecification 
Instance details

Defined in Amazonka.EC2.Types.FleetLaunchTemplateSpecification

Eq FleetLaunchTemplateSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.FleetLaunchTemplateSpecificationRequest

Eq FleetOnDemandAllocationStrategy 
Instance details

Defined in Amazonka.EC2.Types.FleetOnDemandAllocationStrategy

Eq FleetReplacementStrategy 
Instance details

Defined in Amazonka.EC2.Types.FleetReplacementStrategy

Eq FleetSpotCapacityRebalance 
Instance details

Defined in Amazonka.EC2.Types.FleetSpotCapacityRebalance

Eq FleetSpotCapacityRebalanceRequest 
Instance details

Defined in Amazonka.EC2.Types.FleetSpotCapacityRebalanceRequest

Eq FleetSpotMaintenanceStrategies 
Instance details

Defined in Amazonka.EC2.Types.FleetSpotMaintenanceStrategies

Eq FleetSpotMaintenanceStrategiesRequest 
Instance details

Defined in Amazonka.EC2.Types.FleetSpotMaintenanceStrategiesRequest

Eq FleetStateCode 
Instance details

Defined in Amazonka.EC2.Types.FleetStateCode

Eq FleetType 
Instance details

Defined in Amazonka.EC2.Types.FleetType

Eq FlowLog 
Instance details

Defined in Amazonka.EC2.Types.FlowLog

Methods

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

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

Eq FlowLogsResourceType 
Instance details

Defined in Amazonka.EC2.Types.FlowLogsResourceType

Eq FpgaDeviceInfo 
Instance details

Defined in Amazonka.EC2.Types.FpgaDeviceInfo

Eq FpgaDeviceMemoryInfo 
Instance details

Defined in Amazonka.EC2.Types.FpgaDeviceMemoryInfo

Eq FpgaImage 
Instance details

Defined in Amazonka.EC2.Types.FpgaImage

Eq FpgaImageAttribute 
Instance details

Defined in Amazonka.EC2.Types.FpgaImageAttribute

Eq FpgaImageAttributeName 
Instance details

Defined in Amazonka.EC2.Types.FpgaImageAttributeName

Eq FpgaImageState 
Instance details

Defined in Amazonka.EC2.Types.FpgaImageState

Eq FpgaImageStateCode 
Instance details

Defined in Amazonka.EC2.Types.FpgaImageStateCode

Eq FpgaInfo 
Instance details

Defined in Amazonka.EC2.Types.FpgaInfo

Eq GatewayAssociationState 
Instance details

Defined in Amazonka.EC2.Types.GatewayAssociationState

Eq GatewayType 
Instance details

Defined in Amazonka.EC2.Types.GatewayType

Eq GpuDeviceInfo 
Instance details

Defined in Amazonka.EC2.Types.GpuDeviceInfo

Eq GpuDeviceMemoryInfo 
Instance details

Defined in Amazonka.EC2.Types.GpuDeviceMemoryInfo

Eq GpuInfo 
Instance details

Defined in Amazonka.EC2.Types.GpuInfo

Methods

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

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

Eq GroupIdentifier 
Instance details

Defined in Amazonka.EC2.Types.GroupIdentifier

Eq HibernationOptions 
Instance details

Defined in Amazonka.EC2.Types.HibernationOptions

Eq HibernationOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.HibernationOptionsRequest

Eq HistoryRecord 
Instance details

Defined in Amazonka.EC2.Types.HistoryRecord

Eq HistoryRecordEntry 
Instance details

Defined in Amazonka.EC2.Types.HistoryRecordEntry

Eq Host 
Instance details

Defined in Amazonka.EC2.Types.Host

Methods

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

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

Eq HostInstance 
Instance details

Defined in Amazonka.EC2.Types.HostInstance

Eq HostOffering 
Instance details

Defined in Amazonka.EC2.Types.HostOffering

Eq HostProperties 
Instance details

Defined in Amazonka.EC2.Types.HostProperties

Eq HostRecovery 
Instance details

Defined in Amazonka.EC2.Types.HostRecovery

Eq HostReservation 
Instance details

Defined in Amazonka.EC2.Types.HostReservation

Eq HostTenancy 
Instance details

Defined in Amazonka.EC2.Types.HostTenancy

Eq HostnameType 
Instance details

Defined in Amazonka.EC2.Types.HostnameType

Eq HttpTokensState 
Instance details

Defined in Amazonka.EC2.Types.HttpTokensState

Eq HypervisorType 
Instance details

Defined in Amazonka.EC2.Types.HypervisorType

Eq IKEVersionsListValue 
Instance details

Defined in Amazonka.EC2.Types.IKEVersionsListValue

Eq IKEVersionsRequestListValue 
Instance details

Defined in Amazonka.EC2.Types.IKEVersionsRequestListValue

Eq IamInstanceProfile 
Instance details

Defined in Amazonka.EC2.Types.IamInstanceProfile

Eq IamInstanceProfileAssociation 
Instance details

Defined in Amazonka.EC2.Types.IamInstanceProfileAssociation

Eq IamInstanceProfileAssociationState 
Instance details

Defined in Amazonka.EC2.Types.IamInstanceProfileAssociationState

Eq IamInstanceProfileSpecification 
Instance details

Defined in Amazonka.EC2.Types.IamInstanceProfileSpecification

Eq IcmpTypeCode 
Instance details

Defined in Amazonka.EC2.Types.IcmpTypeCode

Eq IdFormat 
Instance details

Defined in Amazonka.EC2.Types.IdFormat

Eq Igmpv2SupportValue 
Instance details

Defined in Amazonka.EC2.Types.Igmpv2SupportValue

Eq Image 
Instance details

Defined in Amazonka.EC2.Types.Image

Methods

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

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

Eq ImageAttributeName 
Instance details

Defined in Amazonka.EC2.Types.ImageAttributeName

Eq ImageDiskContainer 
Instance details

Defined in Amazonka.EC2.Types.ImageDiskContainer

Eq ImageRecycleBinInfo 
Instance details

Defined in Amazonka.EC2.Types.ImageRecycleBinInfo

Eq ImageState 
Instance details

Defined in Amazonka.EC2.Types.ImageState

Eq ImageTypeValues 
Instance details

Defined in Amazonka.EC2.Types.ImageTypeValues

Eq ImdsSupportValues 
Instance details

Defined in Amazonka.EC2.Types.ImdsSupportValues

Eq ImportImageLicenseConfigurationRequest 
Instance details

Defined in Amazonka.EC2.Types.ImportImageLicenseConfigurationRequest

Eq ImportImageLicenseConfigurationResponse 
Instance details

Defined in Amazonka.EC2.Types.ImportImageLicenseConfigurationResponse

Eq ImportImageTask 
Instance details

Defined in Amazonka.EC2.Types.ImportImageTask

Eq ImportInstanceLaunchSpecification 
Instance details

Defined in Amazonka.EC2.Types.ImportInstanceLaunchSpecification

Eq ImportInstanceTaskDetails 
Instance details

Defined in Amazonka.EC2.Types.ImportInstanceTaskDetails

Eq ImportInstanceVolumeDetailItem 
Instance details

Defined in Amazonka.EC2.Types.ImportInstanceVolumeDetailItem

Eq ImportSnapshotTask 
Instance details

Defined in Amazonka.EC2.Types.ImportSnapshotTask

Eq ImportVolumeTaskDetails 
Instance details

Defined in Amazonka.EC2.Types.ImportVolumeTaskDetails

Eq InferenceAcceleratorInfo 
Instance details

Defined in Amazonka.EC2.Types.InferenceAcceleratorInfo

Eq InferenceDeviceInfo 
Instance details

Defined in Amazonka.EC2.Types.InferenceDeviceInfo

Eq Instance 
Instance details

Defined in Amazonka.EC2.Types.Instance

Eq InstanceAttributeName 
Instance details

Defined in Amazonka.EC2.Types.InstanceAttributeName

Eq InstanceAutoRecoveryState 
Instance details

Defined in Amazonka.EC2.Types.InstanceAutoRecoveryState

Eq InstanceBlockDeviceMapping 
Instance details

Defined in Amazonka.EC2.Types.InstanceBlockDeviceMapping

Eq InstanceBlockDeviceMappingSpecification 
Instance details

Defined in Amazonka.EC2.Types.InstanceBlockDeviceMappingSpecification

Eq InstanceCapacity 
Instance details

Defined in Amazonka.EC2.Types.InstanceCapacity

Eq InstanceCount 
Instance details

Defined in Amazonka.EC2.Types.InstanceCount

Eq InstanceCreditSpecification 
Instance details

Defined in Amazonka.EC2.Types.InstanceCreditSpecification

Eq InstanceCreditSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceCreditSpecificationRequest

Eq InstanceEventWindow 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindow

Eq InstanceEventWindowAssociationRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindowAssociationRequest

Eq InstanceEventWindowAssociationTarget 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindowAssociationTarget

Eq InstanceEventWindowDisassociationRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindowDisassociationRequest

Eq InstanceEventWindowState 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindowState

Eq InstanceEventWindowStateChange 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindowStateChange

Eq InstanceEventWindowTimeRange 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindowTimeRange

Eq InstanceEventWindowTimeRangeRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindowTimeRangeRequest

Eq InstanceExportDetails 
Instance details

Defined in Amazonka.EC2.Types.InstanceExportDetails

Eq InstanceFamilyCreditSpecification 
Instance details

Defined in Amazonka.EC2.Types.InstanceFamilyCreditSpecification

Eq InstanceGeneration 
Instance details

Defined in Amazonka.EC2.Types.InstanceGeneration

Eq InstanceHealthStatus 
Instance details

Defined in Amazonka.EC2.Types.InstanceHealthStatus

Eq InstanceInterruptionBehavior 
Instance details

Defined in Amazonka.EC2.Types.InstanceInterruptionBehavior

Eq InstanceIpv4Prefix 
Instance details

Defined in Amazonka.EC2.Types.InstanceIpv4Prefix

Eq InstanceIpv6Address 
Instance details

Defined in Amazonka.EC2.Types.InstanceIpv6Address

Eq InstanceIpv6AddressRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceIpv6AddressRequest

Eq InstanceIpv6Prefix 
Instance details

Defined in Amazonka.EC2.Types.InstanceIpv6Prefix

Eq InstanceLifecycle 
Instance details

Defined in Amazonka.EC2.Types.InstanceLifecycle

Eq InstanceLifecycleType 
Instance details

Defined in Amazonka.EC2.Types.InstanceLifecycleType

Eq InstanceMaintenanceOptions 
Instance details

Defined in Amazonka.EC2.Types.InstanceMaintenanceOptions

Eq InstanceMaintenanceOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceMaintenanceOptionsRequest

Eq InstanceMarketOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceMarketOptionsRequest

Eq InstanceMatchCriteria 
Instance details

Defined in Amazonka.EC2.Types.InstanceMatchCriteria

Eq InstanceMetadataEndpointState 
Instance details

Defined in Amazonka.EC2.Types.InstanceMetadataEndpointState

Eq InstanceMetadataOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceMetadataOptionsRequest

Eq InstanceMetadataOptionsResponse 
Instance details

Defined in Amazonka.EC2.Types.InstanceMetadataOptionsResponse

Eq InstanceMetadataOptionsState 
Instance details

Defined in Amazonka.EC2.Types.InstanceMetadataOptionsState

Eq InstanceMetadataProtocolState 
Instance details

Defined in Amazonka.EC2.Types.InstanceMetadataProtocolState

Eq InstanceMetadataTagsState 
Instance details

Defined in Amazonka.EC2.Types.InstanceMetadataTagsState

Eq InstanceMonitoring 
Instance details

Defined in Amazonka.EC2.Types.InstanceMonitoring

Eq InstanceNetworkInterface 
Instance details

Defined in Amazonka.EC2.Types.InstanceNetworkInterface

Eq InstanceNetworkInterfaceAssociation 
Instance details

Defined in Amazonka.EC2.Types.InstanceNetworkInterfaceAssociation

Eq InstanceNetworkInterfaceAttachment 
Instance details

Defined in Amazonka.EC2.Types.InstanceNetworkInterfaceAttachment

Eq InstanceNetworkInterfaceSpecification 
Instance details

Defined in Amazonka.EC2.Types.InstanceNetworkInterfaceSpecification

Eq InstancePrivateIpAddress 
Instance details

Defined in Amazonka.EC2.Types.InstancePrivateIpAddress

Eq InstanceRequirements 
Instance details

Defined in Amazonka.EC2.Types.InstanceRequirements

Eq InstanceRequirementsRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceRequirementsRequest

Eq InstanceRequirementsWithMetadataRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceRequirementsWithMetadataRequest

Eq InstanceSpecification 
Instance details

Defined in Amazonka.EC2.Types.InstanceSpecification

Eq InstanceState 
Instance details

Defined in Amazonka.EC2.Types.InstanceState

Eq InstanceStateChange 
Instance details

Defined in Amazonka.EC2.Types.InstanceStateChange

Eq InstanceStateName 
Instance details

Defined in Amazonka.EC2.Types.InstanceStateName

Eq InstanceStatus 
Instance details

Defined in Amazonka.EC2.Types.InstanceStatus

Eq InstanceStatusDetails 
Instance details

Defined in Amazonka.EC2.Types.InstanceStatusDetails

Eq InstanceStatusEvent 
Instance details

Defined in Amazonka.EC2.Types.InstanceStatusEvent

Eq InstanceStatusSummary 
Instance details

Defined in Amazonka.EC2.Types.InstanceStatusSummary

Eq InstanceStorageEncryptionSupport 
Instance details

Defined in Amazonka.EC2.Types.InstanceStorageEncryptionSupport

Eq InstanceStorageInfo 
Instance details

Defined in Amazonka.EC2.Types.InstanceStorageInfo

Eq InstanceTagNotificationAttribute 
Instance details

Defined in Amazonka.EC2.Types.InstanceTagNotificationAttribute

Eq InstanceType 
Instance details

Defined in Amazonka.EC2.Types.InstanceType

Eq InstanceTypeHypervisor 
Instance details

Defined in Amazonka.EC2.Types.InstanceTypeHypervisor

Eq InstanceTypeInfo 
Instance details

Defined in Amazonka.EC2.Types.InstanceTypeInfo

Eq InstanceTypeInfoFromInstanceRequirements 
Instance details

Defined in Amazonka.EC2.Types.InstanceTypeInfoFromInstanceRequirements

Eq InstanceTypeOffering 
Instance details

Defined in Amazonka.EC2.Types.InstanceTypeOffering

Eq InstanceUsage 
Instance details

Defined in Amazonka.EC2.Types.InstanceUsage

Eq IntegrateServices 
Instance details

Defined in Amazonka.EC2.Types.IntegrateServices

Eq InterfacePermissionType 
Instance details

Defined in Amazonka.EC2.Types.InterfacePermissionType

Eq InterfaceProtocolType 
Instance details

Defined in Amazonka.EC2.Types.InterfaceProtocolType

Eq InternetGateway 
Instance details

Defined in Amazonka.EC2.Types.InternetGateway

Eq InternetGatewayAttachment 
Instance details

Defined in Amazonka.EC2.Types.InternetGatewayAttachment

Eq IpAddressType 
Instance details

Defined in Amazonka.EC2.Types.IpAddressType

Eq IpPermission 
Instance details

Defined in Amazonka.EC2.Types.IpPermission

Eq IpRange 
Instance details

Defined in Amazonka.EC2.Types.IpRange

Methods

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

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

Eq Ipam 
Instance details

Defined in Amazonka.EC2.Types.Ipam

Methods

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

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

Eq IpamAddressHistoryRecord 
Instance details

Defined in Amazonka.EC2.Types.IpamAddressHistoryRecord

Eq IpamAddressHistoryResourceType 
Instance details

Defined in Amazonka.EC2.Types.IpamAddressHistoryResourceType

Eq IpamCidrAuthorizationContext 
Instance details

Defined in Amazonka.EC2.Types.IpamCidrAuthorizationContext

Eq IpamComplianceStatus 
Instance details

Defined in Amazonka.EC2.Types.IpamComplianceStatus

Eq IpamManagementState 
Instance details

Defined in Amazonka.EC2.Types.IpamManagementState

Eq IpamOperatingRegion 
Instance details

Defined in Amazonka.EC2.Types.IpamOperatingRegion

Eq IpamOverlapStatus 
Instance details

Defined in Amazonka.EC2.Types.IpamOverlapStatus

Eq IpamPool 
Instance details

Defined in Amazonka.EC2.Types.IpamPool

Eq IpamPoolAllocation 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolAllocation

Eq IpamPoolAllocationResourceType 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolAllocationResourceType

Eq IpamPoolAwsService 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolAwsService

Eq IpamPoolCidr 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolCidr

Eq IpamPoolCidrFailureCode 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolCidrFailureCode

Eq IpamPoolCidrFailureReason 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolCidrFailureReason

Eq IpamPoolCidrState 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolCidrState

Eq IpamPoolState 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolState

Eq IpamResourceCidr 
Instance details

Defined in Amazonka.EC2.Types.IpamResourceCidr

Eq IpamResourceTag 
Instance details

Defined in Amazonka.EC2.Types.IpamResourceTag

Eq IpamResourceType 
Instance details

Defined in Amazonka.EC2.Types.IpamResourceType

Eq IpamScope 
Instance details

Defined in Amazonka.EC2.Types.IpamScope

Eq IpamScopeState 
Instance details

Defined in Amazonka.EC2.Types.IpamScopeState

Eq IpamScopeType 
Instance details

Defined in Amazonka.EC2.Types.IpamScopeType

Eq IpamState 
Instance details

Defined in Amazonka.EC2.Types.IpamState

Eq Ipv4PrefixSpecification 
Instance details

Defined in Amazonka.EC2.Types.Ipv4PrefixSpecification

Eq Ipv4PrefixSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.Ipv4PrefixSpecificationRequest

Eq Ipv4PrefixSpecificationResponse 
Instance details

Defined in Amazonka.EC2.Types.Ipv4PrefixSpecificationResponse

Eq Ipv6CidrAssociation 
Instance details

Defined in Amazonka.EC2.Types.Ipv6CidrAssociation

Eq Ipv6CidrBlock 
Instance details

Defined in Amazonka.EC2.Types.Ipv6CidrBlock

Eq Ipv6Pool 
Instance details

Defined in Amazonka.EC2.Types.Ipv6Pool

Eq Ipv6PrefixSpecification 
Instance details

Defined in Amazonka.EC2.Types.Ipv6PrefixSpecification

Eq Ipv6PrefixSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.Ipv6PrefixSpecificationRequest

Eq Ipv6PrefixSpecificationResponse 
Instance details

Defined in Amazonka.EC2.Types.Ipv6PrefixSpecificationResponse

Eq Ipv6Range 
Instance details

Defined in Amazonka.EC2.Types.Ipv6Range

Eq Ipv6SupportValue 
Instance details

Defined in Amazonka.EC2.Types.Ipv6SupportValue

Eq KeyFormat 
Instance details

Defined in Amazonka.EC2.Types.KeyFormat

Eq KeyPairInfo 
Instance details

Defined in Amazonka.EC2.Types.KeyPairInfo

Eq KeyType 
Instance details

Defined in Amazonka.EC2.Types.KeyType

Methods

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

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

Eq LastError 
Instance details

Defined in Amazonka.EC2.Types.LastError

Eq LaunchPermission 
Instance details

Defined in Amazonka.EC2.Types.LaunchPermission

Eq LaunchPermissionModifications 
Instance details

Defined in Amazonka.EC2.Types.LaunchPermissionModifications

Eq LaunchSpecification 
Instance details

Defined in Amazonka.EC2.Types.LaunchSpecification

Eq LaunchTemplate 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplate

Eq LaunchTemplateAndOverridesResponse 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateAndOverridesResponse

Eq LaunchTemplateAutoRecoveryState 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateAutoRecoveryState

Eq LaunchTemplateBlockDeviceMapping 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateBlockDeviceMapping

Eq LaunchTemplateBlockDeviceMappingRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateBlockDeviceMappingRequest

Eq LaunchTemplateCapacityReservationSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateCapacityReservationSpecificationRequest

Eq LaunchTemplateCapacityReservationSpecificationResponse 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateCapacityReservationSpecificationResponse

Eq LaunchTemplateConfig 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateConfig

Eq LaunchTemplateCpuOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateCpuOptions

Eq LaunchTemplateCpuOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateCpuOptionsRequest

Eq LaunchTemplateEbsBlockDevice 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateEbsBlockDevice

Eq LaunchTemplateEbsBlockDeviceRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateEbsBlockDeviceRequest

Eq LaunchTemplateElasticInferenceAccelerator 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateElasticInferenceAccelerator

Eq LaunchTemplateElasticInferenceAcceleratorResponse 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateElasticInferenceAcceleratorResponse

Eq LaunchTemplateEnclaveOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateEnclaveOptions

Eq LaunchTemplateEnclaveOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateEnclaveOptionsRequest

Eq LaunchTemplateErrorCode 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateErrorCode

Eq LaunchTemplateHibernationOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateHibernationOptions

Eq LaunchTemplateHibernationOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateHibernationOptionsRequest

Eq LaunchTemplateHttpTokensState 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateHttpTokensState

Eq LaunchTemplateIamInstanceProfileSpecification 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateIamInstanceProfileSpecification

Eq LaunchTemplateIamInstanceProfileSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateIamInstanceProfileSpecificationRequest

Eq LaunchTemplateInstanceMaintenanceOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMaintenanceOptions

Eq LaunchTemplateInstanceMaintenanceOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMaintenanceOptionsRequest

Eq LaunchTemplateInstanceMarketOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMarketOptions

Eq LaunchTemplateInstanceMarketOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMarketOptionsRequest

Eq LaunchTemplateInstanceMetadataEndpointState 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMetadataEndpointState

Eq LaunchTemplateInstanceMetadataOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMetadataOptions

Eq LaunchTemplateInstanceMetadataOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMetadataOptionsRequest

Eq LaunchTemplateInstanceMetadataOptionsState 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMetadataOptionsState

Eq LaunchTemplateInstanceMetadataProtocolIpv6 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMetadataProtocolIpv6

Eq LaunchTemplateInstanceMetadataTagsState 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMetadataTagsState

Eq LaunchTemplateInstanceNetworkInterfaceSpecification 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceNetworkInterfaceSpecification

Eq LaunchTemplateInstanceNetworkInterfaceSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceNetworkInterfaceSpecificationRequest

Eq LaunchTemplateLicenseConfiguration 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateLicenseConfiguration

Eq LaunchTemplateLicenseConfigurationRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateLicenseConfigurationRequest

Eq LaunchTemplateOverrides 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateOverrides

Eq LaunchTemplatePlacement 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplatePlacement

Eq LaunchTemplatePlacementRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplatePlacementRequest

Eq LaunchTemplatePrivateDnsNameOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplatePrivateDnsNameOptions

Eq LaunchTemplatePrivateDnsNameOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplatePrivateDnsNameOptionsRequest

Eq LaunchTemplateSpecification 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateSpecification

Eq LaunchTemplateSpotMarketOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateSpotMarketOptions

Eq LaunchTemplateSpotMarketOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateSpotMarketOptionsRequest

Eq LaunchTemplateTagSpecification 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateTagSpecification

Eq LaunchTemplateTagSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateTagSpecificationRequest

Eq LaunchTemplateVersion 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateVersion

Eq LaunchTemplatesMonitoring 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplatesMonitoring

Eq LaunchTemplatesMonitoringRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplatesMonitoringRequest

Eq LicenseConfiguration 
Instance details

Defined in Amazonka.EC2.Types.LicenseConfiguration

Eq LicenseConfigurationRequest 
Instance details

Defined in Amazonka.EC2.Types.LicenseConfigurationRequest

Eq ListingState 
Instance details

Defined in Amazonka.EC2.Types.ListingState

Eq ListingStatus 
Instance details

Defined in Amazonka.EC2.Types.ListingStatus

Eq LoadBalancersConfig 
Instance details

Defined in Amazonka.EC2.Types.LoadBalancersConfig

Eq LoadPermission 
Instance details

Defined in Amazonka.EC2.Types.LoadPermission

Eq LoadPermissionModifications 
Instance details

Defined in Amazonka.EC2.Types.LoadPermissionModifications

Eq LoadPermissionRequest 
Instance details

Defined in Amazonka.EC2.Types.LoadPermissionRequest

Eq LocalGateway 
Instance details

Defined in Amazonka.EC2.Types.LocalGateway

Eq LocalGatewayRoute 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRoute

Eq LocalGatewayRouteState 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRouteState

Eq LocalGatewayRouteTable 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRouteTable

Eq LocalGatewayRouteTableMode 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRouteTableMode

Eq LocalGatewayRouteTableVirtualInterfaceGroupAssociation 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRouteTableVirtualInterfaceGroupAssociation

Eq LocalGatewayRouteTableVpcAssociation 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRouteTableVpcAssociation

Eq LocalGatewayRouteType 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRouteType

Eq LocalGatewayVirtualInterface 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayVirtualInterface

Eq LocalGatewayVirtualInterfaceGroup 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayVirtualInterfaceGroup

Eq LocalStorage 
Instance details

Defined in Amazonka.EC2.Types.LocalStorage

Eq LocalStorageType 
Instance details

Defined in Amazonka.EC2.Types.LocalStorageType

Eq LocationType 
Instance details

Defined in Amazonka.EC2.Types.LocationType

Eq LogDestinationType 
Instance details

Defined in Amazonka.EC2.Types.LogDestinationType

Eq ManagedPrefixList 
Instance details

Defined in Amazonka.EC2.Types.ManagedPrefixList

Eq MarketType 
Instance details

Defined in Amazonka.EC2.Types.MarketType

Eq MembershipType 
Instance details

Defined in Amazonka.EC2.Types.MembershipType

Eq MemoryGiBPerVCpu 
Instance details

Defined in Amazonka.EC2.Types.MemoryGiBPerVCpu

Eq MemoryGiBPerVCpuRequest 
Instance details

Defined in Amazonka.EC2.Types.MemoryGiBPerVCpuRequest

Eq MemoryInfo 
Instance details

Defined in Amazonka.EC2.Types.MemoryInfo

Eq MemoryMiB 
Instance details

Defined in Amazonka.EC2.Types.MemoryMiB

Eq MemoryMiBRequest 
Instance details

Defined in Amazonka.EC2.Types.MemoryMiBRequest

Eq MetricPoint 
Instance details

Defined in Amazonka.EC2.Types.MetricPoint

Eq MetricType 
Instance details

Defined in Amazonka.EC2.Types.MetricType

Eq ModifyAvailabilityZoneOptInStatus 
Instance details

Defined in Amazonka.EC2.Types.ModifyAvailabilityZoneOptInStatus

Eq ModifyTransitGatewayOptions 
Instance details

Defined in Amazonka.EC2.Types.ModifyTransitGatewayOptions

Eq ModifyTransitGatewayVpcAttachmentRequestOptions 
Instance details

Defined in Amazonka.EC2.Types.ModifyTransitGatewayVpcAttachmentRequestOptions

Eq ModifyVerifiedAccessEndpointEniOptions 
Instance details

Defined in Amazonka.EC2.Types.ModifyVerifiedAccessEndpointEniOptions

Eq ModifyVerifiedAccessEndpointLoadBalancerOptions 
Instance details

Defined in Amazonka.EC2.Types.ModifyVerifiedAccessEndpointLoadBalancerOptions

Eq ModifyVerifiedAccessTrustProviderOidcOptions 
Instance details

Defined in Amazonka.EC2.Types.ModifyVerifiedAccessTrustProviderOidcOptions

Eq ModifyVpnTunnelOptionsSpecification 
Instance details

Defined in Amazonka.EC2.Types.ModifyVpnTunnelOptionsSpecification

Eq Monitoring 
Instance details

Defined in Amazonka.EC2.Types.Monitoring

Eq MonitoringState 
Instance details

Defined in Amazonka.EC2.Types.MonitoringState

Eq MoveStatus 
Instance details

Defined in Amazonka.EC2.Types.MoveStatus

Eq MovingAddressStatus 
Instance details

Defined in Amazonka.EC2.Types.MovingAddressStatus

Eq MulticastSupportValue 
Instance details

Defined in Amazonka.EC2.Types.MulticastSupportValue

Eq NatGateway 
Instance details

Defined in Amazonka.EC2.Types.NatGateway

Eq NatGatewayAddress 
Instance details

Defined in Amazonka.EC2.Types.NatGatewayAddress

Eq NatGatewayState 
Instance details

Defined in Amazonka.EC2.Types.NatGatewayState

Eq NetworkAcl 
Instance details

Defined in Amazonka.EC2.Types.NetworkAcl

Eq NetworkAclAssociation 
Instance details

Defined in Amazonka.EC2.Types.NetworkAclAssociation

Eq NetworkAclEntry 
Instance details

Defined in Amazonka.EC2.Types.NetworkAclEntry

Eq NetworkBandwidthGbps 
Instance details

Defined in Amazonka.EC2.Types.NetworkBandwidthGbps

Eq NetworkBandwidthGbpsRequest 
Instance details

Defined in Amazonka.EC2.Types.NetworkBandwidthGbpsRequest

Eq NetworkCardInfo 
Instance details

Defined in Amazonka.EC2.Types.NetworkCardInfo

Eq NetworkInfo 
Instance details

Defined in Amazonka.EC2.Types.NetworkInfo

Eq NetworkInsightsAccessScope 
Instance details

Defined in Amazonka.EC2.Types.NetworkInsightsAccessScope

Eq NetworkInsightsAccessScopeAnalysis 
Instance details

Defined in Amazonka.EC2.Types.NetworkInsightsAccessScopeAnalysis

Eq NetworkInsightsAccessScopeContent 
Instance details

Defined in Amazonka.EC2.Types.NetworkInsightsAccessScopeContent

Eq NetworkInsightsAnalysis 
Instance details

Defined in Amazonka.EC2.Types.NetworkInsightsAnalysis

Eq NetworkInsightsPath 
Instance details

Defined in Amazonka.EC2.Types.NetworkInsightsPath

Eq NetworkInterface 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterface

Eq NetworkInterfaceAssociation 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceAssociation

Eq NetworkInterfaceAttachment 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceAttachment

Eq NetworkInterfaceAttachmentChanges 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceAttachmentChanges

Eq NetworkInterfaceAttribute 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceAttribute

Eq NetworkInterfaceCount 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceCount

Eq NetworkInterfaceCountRequest 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceCountRequest

Eq NetworkInterfaceCreationType 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceCreationType

Eq NetworkInterfaceIpv6Address 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceIpv6Address

Eq NetworkInterfacePermission 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfacePermission

Eq NetworkInterfacePermissionState 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfacePermissionState

Eq NetworkInterfacePermissionStateCode 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfacePermissionStateCode

Eq NetworkInterfacePrivateIpAddress 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfacePrivateIpAddress

Eq NetworkInterfaceStatus 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceStatus

Eq NetworkInterfaceType 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceType

Eq NewDhcpConfiguration 
Instance details

Defined in Amazonka.EC2.Types.NewDhcpConfiguration

Eq OfferingClassType 
Instance details

Defined in Amazonka.EC2.Types.OfferingClassType

Eq OfferingTypeValues 
Instance details

Defined in Amazonka.EC2.Types.OfferingTypeValues

Eq OidcOptions 
Instance details

Defined in Amazonka.EC2.Types.OidcOptions

Eq OnDemandAllocationStrategy 
Instance details

Defined in Amazonka.EC2.Types.OnDemandAllocationStrategy

Eq OnDemandOptions 
Instance details

Defined in Amazonka.EC2.Types.OnDemandOptions

Eq OnDemandOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.OnDemandOptionsRequest

Eq OperationType 
Instance details

Defined in Amazonka.EC2.Types.OperationType

Eq PacketHeaderStatement 
Instance details

Defined in Amazonka.EC2.Types.PacketHeaderStatement

Eq PacketHeaderStatementRequest 
Instance details

Defined in Amazonka.EC2.Types.PacketHeaderStatementRequest

Eq PartitionLoadFrequency 
Instance details

Defined in Amazonka.EC2.Types.PartitionLoadFrequency

Eq PathComponent 
Instance details

Defined in Amazonka.EC2.Types.PathComponent

Eq PathStatement 
Instance details

Defined in Amazonka.EC2.Types.PathStatement

Eq PathStatementRequest 
Instance details

Defined in Amazonka.EC2.Types.PathStatementRequest

Eq PayerResponsibility 
Instance details

Defined in Amazonka.EC2.Types.PayerResponsibility

Eq PaymentOption 
Instance details

Defined in Amazonka.EC2.Types.PaymentOption

Eq PciId 
Instance details

Defined in Amazonka.EC2.Types.PciId

Methods

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

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

Eq PeeringAttachmentStatus 
Instance details

Defined in Amazonka.EC2.Types.PeeringAttachmentStatus

Eq PeeringConnectionOptions 
Instance details

Defined in Amazonka.EC2.Types.PeeringConnectionOptions

Eq PeeringConnectionOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.PeeringConnectionOptionsRequest

Eq PeeringTgwInfo 
Instance details

Defined in Amazonka.EC2.Types.PeeringTgwInfo

Eq PeriodType 
Instance details

Defined in Amazonka.EC2.Types.PeriodType

Eq PermissionGroup 
Instance details

Defined in Amazonka.EC2.Types.PermissionGroup

Eq Phase1DHGroupNumbersListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase1DHGroupNumbersListValue

Eq Phase1DHGroupNumbersRequestListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase1DHGroupNumbersRequestListValue

Eq Phase1EncryptionAlgorithmsListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase1EncryptionAlgorithmsListValue

Eq Phase1EncryptionAlgorithmsRequestListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase1EncryptionAlgorithmsRequestListValue

Eq Phase1IntegrityAlgorithmsListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase1IntegrityAlgorithmsListValue

Eq Phase1IntegrityAlgorithmsRequestListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase1IntegrityAlgorithmsRequestListValue

Eq Phase2DHGroupNumbersListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase2DHGroupNumbersListValue

Eq Phase2DHGroupNumbersRequestListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase2DHGroupNumbersRequestListValue

Eq Phase2EncryptionAlgorithmsListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase2EncryptionAlgorithmsListValue

Eq Phase2EncryptionAlgorithmsRequestListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase2EncryptionAlgorithmsRequestListValue

Eq Phase2IntegrityAlgorithmsListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase2IntegrityAlgorithmsListValue

Eq Phase2IntegrityAlgorithmsRequestListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase2IntegrityAlgorithmsRequestListValue

Eq Placement 
Instance details

Defined in Amazonka.EC2.Types.Placement

Eq PlacementGroup 
Instance details

Defined in Amazonka.EC2.Types.PlacementGroup

Eq PlacementGroupInfo 
Instance details

Defined in Amazonka.EC2.Types.PlacementGroupInfo

Eq PlacementGroupState 
Instance details

Defined in Amazonka.EC2.Types.PlacementGroupState

Eq PlacementGroupStrategy 
Instance details

Defined in Amazonka.EC2.Types.PlacementGroupStrategy

Eq PlacementResponse 
Instance details

Defined in Amazonka.EC2.Types.PlacementResponse

Eq PlacementStrategy 
Instance details

Defined in Amazonka.EC2.Types.PlacementStrategy

Eq PlatformValues 
Instance details

Defined in Amazonka.EC2.Types.PlatformValues

Eq PoolCidrBlock 
Instance details

Defined in Amazonka.EC2.Types.PoolCidrBlock

Eq PortRange 
Instance details

Defined in Amazonka.EC2.Types.PortRange

Eq PrefixList 
Instance details

Defined in Amazonka.EC2.Types.PrefixList

Eq PrefixListAssociation 
Instance details

Defined in Amazonka.EC2.Types.PrefixListAssociation

Eq PrefixListEntry 
Instance details

Defined in Amazonka.EC2.Types.PrefixListEntry

Eq PrefixListId 
Instance details

Defined in Amazonka.EC2.Types.PrefixListId

Eq PrefixListState 
Instance details

Defined in Amazonka.EC2.Types.PrefixListState

Eq PriceSchedule 
Instance details

Defined in Amazonka.EC2.Types.PriceSchedule

Eq PriceScheduleSpecification 
Instance details

Defined in Amazonka.EC2.Types.PriceScheduleSpecification

Eq PricingDetail 
Instance details

Defined in Amazonka.EC2.Types.PricingDetail

Eq PrincipalIdFormat 
Instance details

Defined in Amazonka.EC2.Types.PrincipalIdFormat

Eq PrincipalType 
Instance details

Defined in Amazonka.EC2.Types.PrincipalType

Eq PrivateDnsDetails 
Instance details

Defined in Amazonka.EC2.Types.PrivateDnsDetails

Eq PrivateDnsNameConfiguration 
Instance details

Defined in Amazonka.EC2.Types.PrivateDnsNameConfiguration

Eq PrivateDnsNameOptionsOnLaunch 
Instance details

Defined in Amazonka.EC2.Types.PrivateDnsNameOptionsOnLaunch

Eq PrivateDnsNameOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.PrivateDnsNameOptionsRequest

Eq PrivateDnsNameOptionsResponse 
Instance details

Defined in Amazonka.EC2.Types.PrivateDnsNameOptionsResponse

Eq PrivateIpAddressSpecification 
Instance details

Defined in Amazonka.EC2.Types.PrivateIpAddressSpecification

Eq ProcessorInfo 
Instance details

Defined in Amazonka.EC2.Types.ProcessorInfo

Eq ProductCode 
Instance details

Defined in Amazonka.EC2.Types.ProductCode

Eq ProductCodeValues 
Instance details

Defined in Amazonka.EC2.Types.ProductCodeValues

Eq PropagatingVgw 
Instance details

Defined in Amazonka.EC2.Types.PropagatingVgw

Eq Protocol 
Instance details

Defined in Amazonka.EC2.Types.Protocol

Eq ProtocolValue 
Instance details

Defined in Amazonka.EC2.Types.ProtocolValue

Eq ProvisionedBandwidth 
Instance details

Defined in Amazonka.EC2.Types.ProvisionedBandwidth

Eq PtrUpdateStatus 
Instance details

Defined in Amazonka.EC2.Types.PtrUpdateStatus

Eq PublicIpv4Pool 
Instance details

Defined in Amazonka.EC2.Types.PublicIpv4Pool

Eq PublicIpv4PoolRange 
Instance details

Defined in Amazonka.EC2.Types.PublicIpv4PoolRange

Eq Purchase 
Instance details

Defined in Amazonka.EC2.Types.Purchase

Eq PurchaseRequest 
Instance details

Defined in Amazonka.EC2.Types.PurchaseRequest

Eq RIProductDescription 
Instance details

Defined in Amazonka.EC2.Types.RIProductDescription

Eq RecurringCharge 
Instance details

Defined in Amazonka.EC2.Types.RecurringCharge

Eq RecurringChargeFrequency 
Instance details

Defined in Amazonka.EC2.Types.RecurringChargeFrequency

Eq ReferencedSecurityGroup 
Instance details

Defined in Amazonka.EC2.Types.ReferencedSecurityGroup

Eq RegionInfo 
Instance details

Defined in Amazonka.EC2.Types.RegionInfo

Eq RegisterInstanceTagAttributeRequest 
Instance details

Defined in Amazonka.EC2.Types.RegisterInstanceTagAttributeRequest

Eq RemoveIpamOperatingRegion 
Instance details

Defined in Amazonka.EC2.Types.RemoveIpamOperatingRegion

Eq RemovePrefixListEntry 
Instance details

Defined in Amazonka.EC2.Types.RemovePrefixListEntry

Eq ReplaceRootVolumeTask 
Instance details

Defined in Amazonka.EC2.Types.ReplaceRootVolumeTask

Eq ReplaceRootVolumeTaskState 
Instance details

Defined in Amazonka.EC2.Types.ReplaceRootVolumeTaskState

Eq ReplacementStrategy 
Instance details

Defined in Amazonka.EC2.Types.ReplacementStrategy

Eq ReportInstanceReasonCodes 
Instance details

Defined in Amazonka.EC2.Types.ReportInstanceReasonCodes

Eq ReportStatusType 
Instance details

Defined in Amazonka.EC2.Types.ReportStatusType

Eq RequestIpamResourceTag 
Instance details

Defined in Amazonka.EC2.Types.RequestIpamResourceTag

Eq RequestLaunchTemplateData 
Instance details

Defined in Amazonka.EC2.Types.RequestLaunchTemplateData

Eq RequestSpotLaunchSpecification 
Instance details

Defined in Amazonka.EC2.Types.RequestSpotLaunchSpecification

Eq Reservation 
Instance details

Defined in Amazonka.EC2.Types.Reservation

Eq ReservationFleetInstanceSpecification 
Instance details

Defined in Amazonka.EC2.Types.ReservationFleetInstanceSpecification

Eq ReservationState 
Instance details

Defined in Amazonka.EC2.Types.ReservationState

Eq ReservationValue 
Instance details

Defined in Amazonka.EC2.Types.ReservationValue

Eq ReservedInstanceLimitPrice 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstanceLimitPrice

Eq ReservedInstanceReservationValue 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstanceReservationValue

Eq ReservedInstanceState 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstanceState

Eq ReservedInstances 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstances

Eq ReservedInstancesConfiguration 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstancesConfiguration

Eq ReservedInstancesId 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstancesId

Eq ReservedInstancesListing 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstancesListing

Eq ReservedInstancesModification 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstancesModification

Eq ReservedInstancesModificationResult 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstancesModificationResult

Eq ReservedInstancesOffering 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstancesOffering

Eq ResetFpgaImageAttributeName 
Instance details

Defined in Amazonka.EC2.Types.ResetFpgaImageAttributeName

Eq ResetImageAttributeName 
Instance details

Defined in Amazonka.EC2.Types.ResetImageAttributeName

Eq ResourceStatement 
Instance details

Defined in Amazonka.EC2.Types.ResourceStatement

Eq ResourceStatementRequest 
Instance details

Defined in Amazonka.EC2.Types.ResourceStatementRequest

Eq ResourceType 
Instance details

Defined in Amazonka.EC2.Types.ResourceType

Eq ResponseError 
Instance details

Defined in Amazonka.EC2.Types.ResponseError

Eq ResponseLaunchTemplateData 
Instance details

Defined in Amazonka.EC2.Types.ResponseLaunchTemplateData

Eq RootDeviceType 
Instance details

Defined in Amazonka.EC2.Types.RootDeviceType

Eq Route 
Instance details

Defined in Amazonka.EC2.Types.Route

Methods

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

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

Eq RouteOrigin 
Instance details

Defined in Amazonka.EC2.Types.RouteOrigin

Eq RouteState 
Instance details

Defined in Amazonka.EC2.Types.RouteState

Eq RouteTable 
Instance details

Defined in Amazonka.EC2.Types.RouteTable

Eq RouteTableAssociation 
Instance details

Defined in Amazonka.EC2.Types.RouteTableAssociation

Eq RouteTableAssociationState 
Instance details

Defined in Amazonka.EC2.Types.RouteTableAssociationState

Eq RouteTableAssociationStateCode 
Instance details

Defined in Amazonka.EC2.Types.RouteTableAssociationStateCode

Eq RuleAction 
Instance details

Defined in Amazonka.EC2.Types.RuleAction

Eq RunInstancesMonitoringEnabled 
Instance details

Defined in Amazonka.EC2.Types.RunInstancesMonitoringEnabled

Eq S3ObjectTag 
Instance details

Defined in Amazonka.EC2.Types.S3ObjectTag

Eq S3Storage 
Instance details

Defined in Amazonka.EC2.Types.S3Storage

Eq ScheduledInstance 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstance

Eq ScheduledInstanceAvailability 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstanceAvailability

Eq ScheduledInstanceRecurrence 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstanceRecurrence

Eq ScheduledInstanceRecurrenceRequest 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstanceRecurrenceRequest

Eq ScheduledInstancesBlockDeviceMapping 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesBlockDeviceMapping

Eq ScheduledInstancesEbs 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesEbs

Eq ScheduledInstancesIamInstanceProfile 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesIamInstanceProfile

Eq ScheduledInstancesIpv6Address 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesIpv6Address

Eq ScheduledInstancesLaunchSpecification 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesLaunchSpecification

Eq ScheduledInstancesMonitoring 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesMonitoring

Eq ScheduledInstancesNetworkInterface 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesNetworkInterface

Eq ScheduledInstancesPlacement 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesPlacement

Eq ScheduledInstancesPrivateIpAddressConfig 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesPrivateIpAddressConfig

Eq Scope 
Instance details

Defined in Amazonka.EC2.Types.Scope

Methods

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

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

Eq SecurityGroup 
Instance details

Defined in Amazonka.EC2.Types.SecurityGroup

Eq SecurityGroupIdentifier 
Instance details

Defined in Amazonka.EC2.Types.SecurityGroupIdentifier

Eq SecurityGroupReference 
Instance details

Defined in Amazonka.EC2.Types.SecurityGroupReference

Eq SecurityGroupRule 
Instance details

Defined in Amazonka.EC2.Types.SecurityGroupRule

Eq SecurityGroupRuleDescription 
Instance details

Defined in Amazonka.EC2.Types.SecurityGroupRuleDescription

Eq SecurityGroupRuleRequest 
Instance details

Defined in Amazonka.EC2.Types.SecurityGroupRuleRequest

Eq SecurityGroupRuleUpdate 
Instance details

Defined in Amazonka.EC2.Types.SecurityGroupRuleUpdate

Eq SelfServicePortal 
Instance details

Defined in Amazonka.EC2.Types.SelfServicePortal

Eq ServiceConfiguration 
Instance details

Defined in Amazonka.EC2.Types.ServiceConfiguration

Eq ServiceConnectivityType 
Instance details

Defined in Amazonka.EC2.Types.ServiceConnectivityType

Eq ServiceDetail 
Instance details

Defined in Amazonka.EC2.Types.ServiceDetail

Eq ServiceState 
Instance details

Defined in Amazonka.EC2.Types.ServiceState

Eq ServiceType 
Instance details

Defined in Amazonka.EC2.Types.ServiceType

Eq ServiceTypeDetail 
Instance details

Defined in Amazonka.EC2.Types.ServiceTypeDetail

Eq ShutdownBehavior 
Instance details

Defined in Amazonka.EC2.Types.ShutdownBehavior

Eq SlotDateTimeRangeRequest 
Instance details

Defined in Amazonka.EC2.Types.SlotDateTimeRangeRequest

Eq SlotStartTimeRangeRequest 
Instance details

Defined in Amazonka.EC2.Types.SlotStartTimeRangeRequest

Eq Snapshot 
Instance details

Defined in Amazonka.EC2.Types.Snapshot

Eq SnapshotAttributeName 
Instance details

Defined in Amazonka.EC2.Types.SnapshotAttributeName

Eq SnapshotDetail 
Instance details

Defined in Amazonka.EC2.Types.SnapshotDetail

Eq SnapshotDiskContainer 
Instance details

Defined in Amazonka.EC2.Types.SnapshotDiskContainer

Eq SnapshotInfo 
Instance details

Defined in Amazonka.EC2.Types.SnapshotInfo

Eq SnapshotRecycleBinInfo 
Instance details

Defined in Amazonka.EC2.Types.SnapshotRecycleBinInfo

Eq SnapshotState 
Instance details

Defined in Amazonka.EC2.Types.SnapshotState

Eq SnapshotTaskDetail 
Instance details

Defined in Amazonka.EC2.Types.SnapshotTaskDetail

Eq SnapshotTierStatus 
Instance details

Defined in Amazonka.EC2.Types.SnapshotTierStatus

Eq SpotAllocationStrategy 
Instance details

Defined in Amazonka.EC2.Types.SpotAllocationStrategy

Eq SpotCapacityRebalance 
Instance details

Defined in Amazonka.EC2.Types.SpotCapacityRebalance

Eq SpotDatafeedSubscription 
Instance details

Defined in Amazonka.EC2.Types.SpotDatafeedSubscription

Eq SpotFleetLaunchSpecification 
Instance details

Defined in Amazonka.EC2.Types.SpotFleetLaunchSpecification

Eq SpotFleetMonitoring 
Instance details

Defined in Amazonka.EC2.Types.SpotFleetMonitoring

Eq SpotFleetRequestConfig 
Instance details

Defined in Amazonka.EC2.Types.SpotFleetRequestConfig

Eq SpotFleetRequestConfigData 
Instance details

Defined in Amazonka.EC2.Types.SpotFleetRequestConfigData

Eq SpotFleetTagSpecification 
Instance details

Defined in Amazonka.EC2.Types.SpotFleetTagSpecification

Eq SpotInstanceInterruptionBehavior 
Instance details

Defined in Amazonka.EC2.Types.SpotInstanceInterruptionBehavior

Eq SpotInstanceRequest 
Instance details

Defined in Amazonka.EC2.Types.SpotInstanceRequest

Eq SpotInstanceState 
Instance details

Defined in Amazonka.EC2.Types.SpotInstanceState

Eq SpotInstanceStateFault 
Instance details

Defined in Amazonka.EC2.Types.SpotInstanceStateFault

Eq SpotInstanceStatus 
Instance details

Defined in Amazonka.EC2.Types.SpotInstanceStatus

Eq SpotInstanceType 
Instance details

Defined in Amazonka.EC2.Types.SpotInstanceType

Eq SpotMaintenanceStrategies 
Instance details

Defined in Amazonka.EC2.Types.SpotMaintenanceStrategies

Eq SpotMarketOptions 
Instance details

Defined in Amazonka.EC2.Types.SpotMarketOptions

Eq SpotOptions 
Instance details

Defined in Amazonka.EC2.Types.SpotOptions

Eq SpotOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.SpotOptionsRequest

Eq SpotPlacement 
Instance details

Defined in Amazonka.EC2.Types.SpotPlacement

Eq SpotPlacementScore 
Instance details

Defined in Amazonka.EC2.Types.SpotPlacementScore

Eq SpotPrice 
Instance details

Defined in Amazonka.EC2.Types.SpotPrice

Eq SpreadLevel 
Instance details

Defined in Amazonka.EC2.Types.SpreadLevel

Eq StaleIpPermission 
Instance details

Defined in Amazonka.EC2.Types.StaleIpPermission

Eq StaleSecurityGroup 
Instance details

Defined in Amazonka.EC2.Types.StaleSecurityGroup

Eq State 
Instance details

Defined in Amazonka.EC2.Types.State

Methods

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

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

Eq StateReason 
Instance details

Defined in Amazonka.EC2.Types.StateReason

Eq StaticSourcesSupportValue 
Instance details

Defined in Amazonka.EC2.Types.StaticSourcesSupportValue

Eq StatisticType 
Instance details

Defined in Amazonka.EC2.Types.StatisticType

Eq StatusName 
Instance details

Defined in Amazonka.EC2.Types.StatusName

Eq StatusType 
Instance details

Defined in Amazonka.EC2.Types.StatusType

Eq Storage 
Instance details

Defined in Amazonka.EC2.Types.Storage

Methods

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

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

Eq StorageLocation 
Instance details

Defined in Amazonka.EC2.Types.StorageLocation

Eq StorageTier 
Instance details

Defined in Amazonka.EC2.Types.StorageTier

Eq StoreImageTaskResult 
Instance details

Defined in Amazonka.EC2.Types.StoreImageTaskResult

Eq Subnet 
Instance details

Defined in Amazonka.EC2.Types.Subnet

Methods

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

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

Eq SubnetAssociation 
Instance details

Defined in Amazonka.EC2.Types.SubnetAssociation

Eq SubnetCidrBlockState 
Instance details

Defined in Amazonka.EC2.Types.SubnetCidrBlockState

Eq SubnetCidrBlockStateCode 
Instance details

Defined in Amazonka.EC2.Types.SubnetCidrBlockStateCode

Eq SubnetCidrReservation 
Instance details

Defined in Amazonka.EC2.Types.SubnetCidrReservation

Eq SubnetCidrReservationType 
Instance details

Defined in Amazonka.EC2.Types.SubnetCidrReservationType

Eq SubnetIpv6CidrBlockAssociation 
Instance details

Defined in Amazonka.EC2.Types.SubnetIpv6CidrBlockAssociation

Eq SubnetState 
Instance details

Defined in Amazonka.EC2.Types.SubnetState

Eq Subscription 
Instance details

Defined in Amazonka.EC2.Types.Subscription

Eq SuccessfulInstanceCreditSpecificationItem 
Instance details

Defined in Amazonka.EC2.Types.SuccessfulInstanceCreditSpecificationItem

Eq SuccessfulQueuedPurchaseDeletion 
Instance details

Defined in Amazonka.EC2.Types.SuccessfulQueuedPurchaseDeletion

Eq SummaryStatus 
Instance details

Defined in Amazonka.EC2.Types.SummaryStatus

Eq Tag 
Instance details

Defined in Amazonka.EC2.Types.Tag

Methods

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

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

Eq TagDescription 
Instance details

Defined in Amazonka.EC2.Types.TagDescription

Eq TagSpecification 
Instance details

Defined in Amazonka.EC2.Types.TagSpecification

Eq TargetCapacitySpecification 
Instance details

Defined in Amazonka.EC2.Types.TargetCapacitySpecification

Eq TargetCapacitySpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.TargetCapacitySpecificationRequest

Eq TargetCapacityUnitType 
Instance details

Defined in Amazonka.EC2.Types.TargetCapacityUnitType

Eq TargetConfiguration 
Instance details

Defined in Amazonka.EC2.Types.TargetConfiguration

Eq TargetConfigurationRequest 
Instance details

Defined in Amazonka.EC2.Types.TargetConfigurationRequest

Eq TargetGroup 
Instance details

Defined in Amazonka.EC2.Types.TargetGroup

Eq TargetGroupsConfig 
Instance details

Defined in Amazonka.EC2.Types.TargetGroupsConfig

Eq TargetNetwork 
Instance details

Defined in Amazonka.EC2.Types.TargetNetwork

Eq TargetReservationValue 
Instance details

Defined in Amazonka.EC2.Types.TargetReservationValue

Eq TargetStorageTier 
Instance details

Defined in Amazonka.EC2.Types.TargetStorageTier

Eq TelemetryStatus 
Instance details

Defined in Amazonka.EC2.Types.TelemetryStatus

Eq Tenancy 
Instance details

Defined in Amazonka.EC2.Types.Tenancy

Methods

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

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

Eq TerminateConnectionStatus 
Instance details

Defined in Amazonka.EC2.Types.TerminateConnectionStatus

Eq ThroughResourcesStatement 
Instance details

Defined in Amazonka.EC2.Types.ThroughResourcesStatement

Eq ThroughResourcesStatementRequest 
Instance details

Defined in Amazonka.EC2.Types.ThroughResourcesStatementRequest

Eq TieringOperationStatus 
Instance details

Defined in Amazonka.EC2.Types.TieringOperationStatus

Eq TotalLocalStorageGB 
Instance details

Defined in Amazonka.EC2.Types.TotalLocalStorageGB

Eq TotalLocalStorageGBRequest 
Instance details

Defined in Amazonka.EC2.Types.TotalLocalStorageGBRequest

Eq TpmSupportValues 
Instance details

Defined in Amazonka.EC2.Types.TpmSupportValues

Eq TrafficDirection 
Instance details

Defined in Amazonka.EC2.Types.TrafficDirection

Eq TrafficMirrorFilter 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorFilter

Eq TrafficMirrorFilterRule 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorFilterRule

Eq TrafficMirrorFilterRuleField 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorFilterRuleField

Eq TrafficMirrorNetworkService 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorNetworkService

Eq TrafficMirrorPortRange 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorPortRange

Eq TrafficMirrorPortRangeRequest 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorPortRangeRequest

Eq TrafficMirrorRuleAction 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorRuleAction

Eq TrafficMirrorSession 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorSession

Eq TrafficMirrorSessionField 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorSessionField

Eq TrafficMirrorTarget 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorTarget

Eq TrafficMirrorTargetType 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorTargetType

Eq TrafficType 
Instance details

Defined in Amazonka.EC2.Types.TrafficType

Eq TransitGateway 
Instance details

Defined in Amazonka.EC2.Types.TransitGateway

Eq TransitGatewayAssociation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAssociation

Eq TransitGatewayAssociationState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAssociationState

Eq TransitGatewayAttachment 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAttachment

Eq TransitGatewayAttachmentAssociation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAttachmentAssociation

Eq TransitGatewayAttachmentBgpConfiguration 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAttachmentBgpConfiguration

Eq TransitGatewayAttachmentPropagation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAttachmentPropagation

Eq TransitGatewayAttachmentResourceType 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAttachmentResourceType

Eq TransitGatewayAttachmentState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAttachmentState

Eq TransitGatewayConnect 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayConnect

Eq TransitGatewayConnectOptions 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayConnectOptions

Eq TransitGatewayConnectPeer 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayConnectPeer

Eq TransitGatewayConnectPeerConfiguration 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayConnectPeerConfiguration

Eq TransitGatewayConnectPeerState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayConnectPeerState

Eq TransitGatewayConnectRequestBgpOptions 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayConnectRequestBgpOptions

Eq TransitGatewayMulitcastDomainAssociationState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulitcastDomainAssociationState

Eq TransitGatewayMulticastDeregisteredGroupMembers 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastDeregisteredGroupMembers

Eq TransitGatewayMulticastDeregisteredGroupSources 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastDeregisteredGroupSources

Eq TransitGatewayMulticastDomain 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastDomain

Eq TransitGatewayMulticastDomainAssociation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastDomainAssociation

Eq TransitGatewayMulticastDomainAssociations 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastDomainAssociations

Eq TransitGatewayMulticastDomainOptions 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastDomainOptions

Eq TransitGatewayMulticastDomainState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastDomainState

Eq TransitGatewayMulticastGroup 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastGroup

Eq TransitGatewayMulticastRegisteredGroupMembers 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastRegisteredGroupMembers

Eq TransitGatewayMulticastRegisteredGroupSources 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastRegisteredGroupSources

Eq TransitGatewayOptions 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayOptions

Eq TransitGatewayPeeringAttachment 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPeeringAttachment

Eq TransitGatewayPeeringAttachmentOptions 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPeeringAttachmentOptions

Eq TransitGatewayPolicyRule 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPolicyRule

Eq TransitGatewayPolicyRuleMetaData 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPolicyRuleMetaData

Eq TransitGatewayPolicyTable 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPolicyTable

Eq TransitGatewayPolicyTableAssociation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPolicyTableAssociation

Eq TransitGatewayPolicyTableEntry 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPolicyTableEntry

Eq TransitGatewayPolicyTableState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPolicyTableState

Eq TransitGatewayPrefixListAttachment 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPrefixListAttachment

Eq TransitGatewayPrefixListReference 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPrefixListReference

Eq TransitGatewayPrefixListReferenceState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPrefixListReferenceState

Eq TransitGatewayPropagation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPropagation

Eq TransitGatewayPropagationState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPropagationState

Eq TransitGatewayRequestOptions 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRequestOptions

Eq TransitGatewayRoute 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRoute

Eq TransitGatewayRouteAttachment 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteAttachment

Eq TransitGatewayRouteState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteState

Eq TransitGatewayRouteTable 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTable

Eq TransitGatewayRouteTableAnnouncement 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTableAnnouncement

Eq TransitGatewayRouteTableAnnouncementDirection 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTableAnnouncementDirection

Eq TransitGatewayRouteTableAnnouncementState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTableAnnouncementState

Eq TransitGatewayRouteTableAssociation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTableAssociation

Eq TransitGatewayRouteTablePropagation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTablePropagation

Eq TransitGatewayRouteTableRoute 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTableRoute

Eq TransitGatewayRouteTableState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTableState

Eq TransitGatewayRouteType 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteType

Eq TransitGatewayState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayState

Eq TransitGatewayVpcAttachment 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayVpcAttachment

Eq TransitGatewayVpcAttachmentOptions 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayVpcAttachmentOptions

Eq TransportProtocol 
Instance details

Defined in Amazonka.EC2.Types.TransportProtocol

Eq TrunkInterfaceAssociation 
Instance details

Defined in Amazonka.EC2.Types.TrunkInterfaceAssociation

Eq TrustProviderType 
Instance details

Defined in Amazonka.EC2.Types.TrustProviderType

Eq TunnelInsideIpVersion 
Instance details

Defined in Amazonka.EC2.Types.TunnelInsideIpVersion

Eq TunnelOption 
Instance details

Defined in Amazonka.EC2.Types.TunnelOption

Eq UnlimitedSupportedInstanceFamily 
Instance details

Defined in Amazonka.EC2.Types.UnlimitedSupportedInstanceFamily

Eq UnsuccessfulInstanceCreditSpecificationErrorCode 
Instance details

Defined in Amazonka.EC2.Types.UnsuccessfulInstanceCreditSpecificationErrorCode

Eq UnsuccessfulInstanceCreditSpecificationItem 
Instance details

Defined in Amazonka.EC2.Types.UnsuccessfulInstanceCreditSpecificationItem

Eq UnsuccessfulInstanceCreditSpecificationItemError 
Instance details

Defined in Amazonka.EC2.Types.UnsuccessfulInstanceCreditSpecificationItemError

Eq UnsuccessfulItem 
Instance details

Defined in Amazonka.EC2.Types.UnsuccessfulItem

Eq UnsuccessfulItemError 
Instance details

Defined in Amazonka.EC2.Types.UnsuccessfulItemError

Eq UsageClassType 
Instance details

Defined in Amazonka.EC2.Types.UsageClassType

Eq UserBucket 
Instance details

Defined in Amazonka.EC2.Types.UserBucket

Eq UserBucketDetails 
Instance details

Defined in Amazonka.EC2.Types.UserBucketDetails

Eq UserData 
Instance details

Defined in Amazonka.EC2.Types.UserData

Eq UserIdGroupPair 
Instance details

Defined in Amazonka.EC2.Types.UserIdGroupPair

Eq UserTrustProviderType 
Instance details

Defined in Amazonka.EC2.Types.UserTrustProviderType

Eq VCpuCountRange 
Instance details

Defined in Amazonka.EC2.Types.VCpuCountRange

Eq VCpuCountRangeRequest 
Instance details

Defined in Amazonka.EC2.Types.VCpuCountRangeRequest

Eq VCpuInfo 
Instance details

Defined in Amazonka.EC2.Types.VCpuInfo

Eq ValidationError 
Instance details

Defined in Amazonka.EC2.Types.ValidationError

Eq ValidationWarning 
Instance details

Defined in Amazonka.EC2.Types.ValidationWarning

Eq VerifiedAccessEndpoint 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpoint

Eq VerifiedAccessEndpointAttachmentType 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointAttachmentType

Eq VerifiedAccessEndpointEniOptions 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointEniOptions

Eq VerifiedAccessEndpointLoadBalancerOptions 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointLoadBalancerOptions

Eq VerifiedAccessEndpointProtocol 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointProtocol

Eq VerifiedAccessEndpointStatus 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointStatus

Eq VerifiedAccessEndpointStatusCode 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointStatusCode

Eq VerifiedAccessEndpointType 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointType

Eq VerifiedAccessGroup 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessGroup

Eq VerifiedAccessInstance 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessInstance

Eq VerifiedAccessInstanceLoggingConfiguration 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessInstanceLoggingConfiguration

Eq VerifiedAccessLogCloudWatchLogsDestination 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogCloudWatchLogsDestination

Eq VerifiedAccessLogCloudWatchLogsDestinationOptions 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogCloudWatchLogsDestinationOptions

Eq VerifiedAccessLogDeliveryStatus 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogDeliveryStatus

Eq VerifiedAccessLogDeliveryStatusCode 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogDeliveryStatusCode

Eq VerifiedAccessLogKinesisDataFirehoseDestination 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogKinesisDataFirehoseDestination

Eq VerifiedAccessLogKinesisDataFirehoseDestinationOptions 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogKinesisDataFirehoseDestinationOptions

Eq VerifiedAccessLogOptions 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogOptions

Eq VerifiedAccessLogS3Destination 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogS3Destination

Eq VerifiedAccessLogS3DestinationOptions 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogS3DestinationOptions

Eq VerifiedAccessLogs 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogs

Eq VerifiedAccessTrustProvider 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessTrustProvider

Eq VerifiedAccessTrustProviderCondensed 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessTrustProviderCondensed

Eq VgwTelemetry 
Instance details

Defined in Amazonka.EC2.Types.VgwTelemetry

Eq VirtualizationType 
Instance details

Defined in Amazonka.EC2.Types.VirtualizationType

Eq Volume 
Instance details

Defined in Amazonka.EC2.Types.Volume

Methods

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

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

Eq VolumeAttachment 
Instance details

Defined in Amazonka.EC2.Types.VolumeAttachment

Eq VolumeAttachmentState 
Instance details

Defined in Amazonka.EC2.Types.VolumeAttachmentState

Eq VolumeAttributeName 
Instance details

Defined in Amazonka.EC2.Types.VolumeAttributeName

Eq VolumeDetail 
Instance details

Defined in Amazonka.EC2.Types.VolumeDetail

Eq VolumeModification 
Instance details

Defined in Amazonka.EC2.Types.VolumeModification

Eq VolumeModificationState 
Instance details

Defined in Amazonka.EC2.Types.VolumeModificationState

Eq VolumeState 
Instance details

Defined in Amazonka.EC2.Types.VolumeState

Eq VolumeStatusAction 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusAction

Eq VolumeStatusAttachmentStatus 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusAttachmentStatus

Eq VolumeStatusDetails 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusDetails

Eq VolumeStatusEvent 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusEvent

Eq VolumeStatusInfo 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusInfo

Eq VolumeStatusInfoStatus 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusInfoStatus

Eq VolumeStatusItem 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusItem

Eq VolumeStatusName 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusName

Eq VolumeType 
Instance details

Defined in Amazonka.EC2.Types.VolumeType

Eq Vpc 
Instance details

Defined in Amazonka.EC2.Types.Vpc

Methods

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

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

Eq VpcAttachment 
Instance details

Defined in Amazonka.EC2.Types.VpcAttachment

Eq VpcAttributeName 
Instance details

Defined in Amazonka.EC2.Types.VpcAttributeName

Eq VpcCidrBlockAssociation 
Instance details

Defined in Amazonka.EC2.Types.VpcCidrBlockAssociation

Eq VpcCidrBlockState 
Instance details

Defined in Amazonka.EC2.Types.VpcCidrBlockState

Eq VpcCidrBlockStateCode 
Instance details

Defined in Amazonka.EC2.Types.VpcCidrBlockStateCode

Eq VpcClassicLink 
Instance details

Defined in Amazonka.EC2.Types.VpcClassicLink

Eq VpcEndpoint 
Instance details

Defined in Amazonka.EC2.Types.VpcEndpoint

Eq VpcEndpointConnection 
Instance details

Defined in Amazonka.EC2.Types.VpcEndpointConnection

Eq VpcEndpointType 
Instance details

Defined in Amazonka.EC2.Types.VpcEndpointType

Eq VpcIpv6CidrBlockAssociation 
Instance details

Defined in Amazonka.EC2.Types.VpcIpv6CidrBlockAssociation

Eq VpcPeeringConnection 
Instance details

Defined in Amazonka.EC2.Types.VpcPeeringConnection

Eq VpcPeeringConnectionOptionsDescription 
Instance details

Defined in Amazonka.EC2.Types.VpcPeeringConnectionOptionsDescription

Eq VpcPeeringConnectionStateReason 
Instance details

Defined in Amazonka.EC2.Types.VpcPeeringConnectionStateReason

Eq VpcPeeringConnectionStateReasonCode 
Instance details

Defined in Amazonka.EC2.Types.VpcPeeringConnectionStateReasonCode

Eq VpcPeeringConnectionVpcInfo 
Instance details

Defined in Amazonka.EC2.Types.VpcPeeringConnectionVpcInfo

Eq VpcState 
Instance details

Defined in Amazonka.EC2.Types.VpcState

Eq VpcTenancy 
Instance details

Defined in Amazonka.EC2.Types.VpcTenancy

Eq VpnConnection 
Instance details

Defined in Amazonka.EC2.Types.VpnConnection

Eq VpnConnectionDeviceType 
Instance details

Defined in Amazonka.EC2.Types.VpnConnectionDeviceType

Eq VpnConnectionOptions 
Instance details

Defined in Amazonka.EC2.Types.VpnConnectionOptions

Eq VpnConnectionOptionsSpecification 
Instance details

Defined in Amazonka.EC2.Types.VpnConnectionOptionsSpecification

Eq VpnEcmpSupportValue 
Instance details

Defined in Amazonka.EC2.Types.VpnEcmpSupportValue

Eq VpnGateway 
Instance details

Defined in Amazonka.EC2.Types.VpnGateway

Eq VpnProtocol 
Instance details

Defined in Amazonka.EC2.Types.VpnProtocol

Eq VpnState 
Instance details

Defined in Amazonka.EC2.Types.VpnState

Eq VpnStaticRoute 
Instance details

Defined in Amazonka.EC2.Types.VpnStaticRoute

Eq VpnStaticRouteSource 
Instance details

Defined in Amazonka.EC2.Types.VpnStaticRouteSource

Eq VpnTunnelLogOptions 
Instance details

Defined in Amazonka.EC2.Types.VpnTunnelLogOptions

Eq VpnTunnelLogOptionsSpecification 
Instance details

Defined in Amazonka.EC2.Types.VpnTunnelLogOptionsSpecification

Eq VpnTunnelOptionsSpecification 
Instance details

Defined in Amazonka.EC2.Types.VpnTunnelOptionsSpecification

Eq WeekDay 
Instance details

Defined in Amazonka.EC2.Types.WeekDay

Methods

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

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

Eq Invoke 
Instance details

Defined in Amazonka.Lambda.Invoke

Methods

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

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

Eq InvokeResponse 
Instance details

Defined in Amazonka.Lambda.Invoke

Eq AccountLimit 
Instance details

Defined in Amazonka.Lambda.Types.AccountLimit

Eq AccountUsage 
Instance details

Defined in Amazonka.Lambda.Types.AccountUsage

Eq AliasConfiguration 
Instance details

Defined in Amazonka.Lambda.Types.AliasConfiguration

Eq AliasRoutingConfiguration 
Instance details

Defined in Amazonka.Lambda.Types.AliasRoutingConfiguration

Eq AllowedPublishers 
Instance details

Defined in Amazonka.Lambda.Types.AllowedPublishers

Eq AmazonManagedKafkaEventSourceConfig 
Instance details

Defined in Amazonka.Lambda.Types.AmazonManagedKafkaEventSourceConfig

Eq Architecture 
Instance details

Defined in Amazonka.Lambda.Types.Architecture

Eq CodeSigningConfig 
Instance details

Defined in Amazonka.Lambda.Types.CodeSigningConfig

Eq CodeSigningPolicies 
Instance details

Defined in Amazonka.Lambda.Types.CodeSigningPolicies

Eq CodeSigningPolicy 
Instance details

Defined in Amazonka.Lambda.Types.CodeSigningPolicy

Eq Concurrency 
Instance details

Defined in Amazonka.Lambda.Types.Concurrency

Eq Cors 
Instance details

Defined in Amazonka.Lambda.Types.Cors

Methods

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

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

Eq DeadLetterConfig 
Instance details

Defined in Amazonka.Lambda.Types.DeadLetterConfig

Eq DestinationConfig 
Instance details

Defined in Amazonka.Lambda.Types.DestinationConfig

Eq EndPointType 
Instance details

Defined in Amazonka.Lambda.Types.EndPointType

Eq Environment 
Instance details

Defined in Amazonka.Lambda.Types.Environment

Eq EnvironmentError 
Instance details

Defined in Amazonka.Lambda.Types.EnvironmentError

Eq EnvironmentResponse 
Instance details

Defined in Amazonka.Lambda.Types.EnvironmentResponse

Eq EphemeralStorage 
Instance details

Defined in Amazonka.Lambda.Types.EphemeralStorage

Eq EventSourceMappingConfiguration 
Instance details

Defined in Amazonka.Lambda.Types.EventSourceMappingConfiguration

Eq EventSourcePosition 
Instance details

Defined in Amazonka.Lambda.Types.EventSourcePosition

Eq FileSystemConfig 
Instance details

Defined in Amazonka.Lambda.Types.FileSystemConfig

Eq Filter 
Instance details

Defined in Amazonka.Lambda.Types.Filter

Methods

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

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

Eq FilterCriteria 
Instance details

Defined in Amazonka.Lambda.Types.FilterCriteria

Eq FunctionCode 
Instance details

Defined in Amazonka.Lambda.Types.FunctionCode

Eq FunctionCodeLocation 
Instance details

Defined in Amazonka.Lambda.Types.FunctionCodeLocation

Eq FunctionConfiguration 
Instance details

Defined in Amazonka.Lambda.Types.FunctionConfiguration

Eq FunctionEventInvokeConfig 
Instance details

Defined in Amazonka.Lambda.Types.FunctionEventInvokeConfig

Eq FunctionResponseType 
Instance details

Defined in Amazonka.Lambda.Types.FunctionResponseType

Eq FunctionUrlAuthType 
Instance details

Defined in Amazonka.Lambda.Types.FunctionUrlAuthType

Eq FunctionUrlConfig 
Instance details

Defined in Amazonka.Lambda.Types.FunctionUrlConfig

Eq FunctionVersion 
Instance details

Defined in Amazonka.Lambda.Types.FunctionVersion

Eq GetLayerVersionResponse 
Instance details

Defined in Amazonka.Lambda.Types.GetLayerVersionResponse

Eq ImageConfig 
Instance details

Defined in Amazonka.Lambda.Types.ImageConfig

Eq ImageConfigError 
Instance details

Defined in Amazonka.Lambda.Types.ImageConfigError

Eq ImageConfigResponse 
Instance details

Defined in Amazonka.Lambda.Types.ImageConfigResponse

Eq InvocationType 
Instance details

Defined in Amazonka.Lambda.Types.InvocationType

Eq LastUpdateStatus 
Instance details

Defined in Amazonka.Lambda.Types.LastUpdateStatus

Eq LastUpdateStatusReasonCode 
Instance details

Defined in Amazonka.Lambda.Types.LastUpdateStatusReasonCode

Eq Layer 
Instance details

Defined in Amazonka.Lambda.Types.Layer

Methods

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

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

Eq LayerVersionContentInput 
Instance details

Defined in Amazonka.Lambda.Types.LayerVersionContentInput

Eq LayerVersionContentOutput 
Instance details

Defined in Amazonka.Lambda.Types.LayerVersionContentOutput

Eq LayerVersionsListItem 
Instance details

Defined in Amazonka.Lambda.Types.LayerVersionsListItem

Eq LayersListItem 
Instance details

Defined in Amazonka.Lambda.Types.LayersListItem

Eq LogType 
Instance details

Defined in Amazonka.Lambda.Types.LogType

Methods

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

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

Eq OnFailure 
Instance details

Defined in Amazonka.Lambda.Types.OnFailure

Eq OnSuccess 
Instance details

Defined in Amazonka.Lambda.Types.OnSuccess

Eq PackageType 
Instance details

Defined in Amazonka.Lambda.Types.PackageType

Eq ProvisionedConcurrencyConfigListItem 
Instance details

Defined in Amazonka.Lambda.Types.ProvisionedConcurrencyConfigListItem

Eq ProvisionedConcurrencyStatusEnum 
Instance details

Defined in Amazonka.Lambda.Types.ProvisionedConcurrencyStatusEnum

Eq Runtime 
Instance details

Defined in Amazonka.Lambda.Types.Runtime

Methods

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

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

Eq SelfManagedEventSource 
Instance details

Defined in Amazonka.Lambda.Types.SelfManagedEventSource

Eq SelfManagedKafkaEventSourceConfig 
Instance details

Defined in Amazonka.Lambda.Types.SelfManagedKafkaEventSourceConfig

Eq SnapStart 
Instance details

Defined in Amazonka.Lambda.Types.SnapStart

Eq SnapStartApplyOn 
Instance details

Defined in Amazonka.Lambda.Types.SnapStartApplyOn

Eq SnapStartOptimizationStatus 
Instance details

Defined in Amazonka.Lambda.Types.SnapStartOptimizationStatus

Eq SnapStartResponse 
Instance details

Defined in Amazonka.Lambda.Types.SnapStartResponse

Eq SourceAccessConfiguration 
Instance details

Defined in Amazonka.Lambda.Types.SourceAccessConfiguration

Eq SourceAccessType 
Instance details

Defined in Amazonka.Lambda.Types.SourceAccessType

Eq State 
Instance details

Defined in Amazonka.Lambda.Types.State

Methods

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

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

Eq StateReasonCode 
Instance details

Defined in Amazonka.Lambda.Types.StateReasonCode

Eq TracingConfig 
Instance details

Defined in Amazonka.Lambda.Types.TracingConfig

Eq TracingConfigResponse 
Instance details

Defined in Amazonka.Lambda.Types.TracingConfigResponse

Eq TracingMode 
Instance details

Defined in Amazonka.Lambda.Types.TracingMode

Eq VpcConfig 
Instance details

Defined in Amazonka.Lambda.Types.VpcConfig

Eq VpcConfigResponse 
Instance details

Defined in Amazonka.Lambda.Types.VpcConfigResponse

Eq GetRoleCredentials 
Instance details

Defined in Amazonka.SSO.GetRoleCredentials

Eq GetRoleCredentialsResponse 
Instance details

Defined in Amazonka.SSO.GetRoleCredentials

Eq ListAccountRoles 
Instance details

Defined in Amazonka.SSO.ListAccountRoles

Eq ListAccountRolesResponse 
Instance details

Defined in Amazonka.SSO.ListAccountRoles

Eq ListAccounts 
Instance details

Defined in Amazonka.SSO.ListAccounts

Eq ListAccountsResponse 
Instance details

Defined in Amazonka.SSO.ListAccounts

Eq Logout 
Instance details

Defined in Amazonka.SSO.Logout

Methods

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

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

Eq LogoutResponse 
Instance details

Defined in Amazonka.SSO.Logout

Eq AccountInfo 
Instance details

Defined in Amazonka.SSO.Types.AccountInfo

Eq RoleCredentials 
Instance details

Defined in Amazonka.SSO.Types.RoleCredentials

Eq RoleInfo 
Instance details

Defined in Amazonka.SSO.Types.RoleInfo

Eq AssumeRole 
Instance details

Defined in Amazonka.STS.AssumeRole

Eq AssumeRoleResponse 
Instance details

Defined in Amazonka.STS.AssumeRole

Eq AssumeRoleWithSAML 
Instance details

Defined in Amazonka.STS.AssumeRoleWithSAML

Eq AssumeRoleWithSAMLResponse 
Instance details

Defined in Amazonka.STS.AssumeRoleWithSAML

Eq AssumeRoleWithWebIdentity 
Instance details

Defined in Amazonka.STS.AssumeRoleWithWebIdentity

Eq AssumeRoleWithWebIdentityResponse 
Instance details

Defined in Amazonka.STS.AssumeRoleWithWebIdentity

Eq DecodeAuthorizationMessage 
Instance details

Defined in Amazonka.STS.DecodeAuthorizationMessage

Eq DecodeAuthorizationMessageResponse 
Instance details

Defined in Amazonka.STS.DecodeAuthorizationMessage

Eq GetAccessKeyInfo 
Instance details

Defined in Amazonka.STS.GetAccessKeyInfo

Eq GetAccessKeyInfoResponse 
Instance details

Defined in Amazonka.STS.GetAccessKeyInfo

Eq GetCallerIdentity 
Instance details

Defined in Amazonka.STS.GetCallerIdentity

Eq GetCallerIdentityResponse 
Instance details

Defined in Amazonka.STS.GetCallerIdentity

Eq GetFederationToken 
Instance details

Defined in Amazonka.STS.GetFederationToken

Eq GetFederationTokenResponse 
Instance details

Defined in Amazonka.STS.GetFederationToken

Eq GetSessionToken 
Instance details

Defined in Amazonka.STS.GetSessionToken

Eq GetSessionTokenResponse 
Instance details

Defined in Amazonka.STS.GetSessionToken

Eq AssumedRoleUser 
Instance details

Defined in Amazonka.STS.Types.AssumedRoleUser

Eq FederatedUser 
Instance details

Defined in Amazonka.STS.Types.FederatedUser

Eq PolicyDescriptorType 
Instance details

Defined in Amazonka.STS.Types.PolicyDescriptorType

Eq Tag 
Instance details

Defined in Amazonka.STS.Types.Tag

Methods

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

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

Eq AsyncCancelled 
Instance details

Defined in Control.Concurrent.Async

Eq More 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

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

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

Eq Pos 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

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

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

Eq Constr

Equality of constructors

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

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

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

Eq ConstrRep

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Eq DataRep

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

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

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

Eq Fixity

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

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

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

Eq All

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

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

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

Eq Any

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

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

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

Eq SomeTypeRep 
Instance details

Defined in Data.Typeable.Internal

Eq Version

Since: base-2.1

Instance details

Defined in Data.Version

Methods

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

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

Eq Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Methods

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

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

Eq CBool 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Eq CChar 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Eq CClock 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Eq CDouble 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Eq CFloat 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Eq CInt 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Eq CIntMax 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Eq CIntPtr 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Eq CLLong 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Eq CLong 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Eq CPtrdiff 
Instance details

Defined in Foreign.C.Types

Eq CSChar 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Eq CSUSeconds 
Instance details

Defined in Foreign.C.Types

Eq CShort 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Eq CSigAtomic 
Instance details

Defined in Foreign.C.Types

Eq CSize 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Eq CTime 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Eq CUChar 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Eq CUInt 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Eq CUIntMax 
Instance details

Defined in Foreign.C.Types

Eq CUIntPtr 
Instance details

Defined in Foreign.C.Types

Eq CULLong 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Eq CULong 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Eq CUSeconds 
Instance details

Defined in Foreign.C.Types

Eq CUShort 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Eq CWchar 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Eq BlockReason

Since: base-4.3.0.0

Instance details

Defined in GHC.Conc.Sync

Eq ThreadId

Since: base-4.2.0.0

Instance details

Defined in GHC.Conc.Sync

Eq ThreadStatus

Since: base-4.3.0.0

Instance details

Defined in GHC.Conc.Sync

Eq ArithException

Since: base-3.0

Instance details

Defined in GHC.Exception.Type

Eq SpecConstrAnnotation

Since: base-4.3.0.0

Instance details

Defined in GHC.Exts

Eq Fingerprint

Since: base-4.4.0.0

Instance details

Defined in GHC.Fingerprint.Type

Eq Associativity

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Eq DecidedStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Eq Fixity

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Methods

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

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

Eq SourceStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Eq SourceUnpackedness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Eq MaskingState

Since: base-4.3.0.0

Instance details

Defined in GHC.IO

Eq IODeviceType

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Device

Eq SeekMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Device

Eq ArrayException

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Exception

Eq AsyncException

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Exception

Eq ExitCode 
Instance details

Defined in GHC.IO.Exception

Eq IOErrorType

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Eq IOException

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Eq BufferMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Handle.Types

Eq Handle

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Handle.Types

Methods

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

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

Eq Newline

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Handle.Types

Methods

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

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

Eq NewlineMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Handle.Types

Eq IOMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.IOMode

Methods

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

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

Eq Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

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

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

Eq Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

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

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

Eq Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

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

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

Eq Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

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

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

Eq IoSubSystem 
Instance details

Defined in GHC.RTS.Flags

Eq SrcLoc

Since: base-4.9.0.0

Instance details

Defined in GHC.Stack.Types

Methods

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

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

Eq SomeChar 
Instance details

Defined in GHC.TypeLits

Eq SomeSymbol

Since: base-4.7.0.0

Instance details

Defined in GHC.TypeLits

Eq SomeNat

Since: base-4.7.0.0

Instance details

Defined in GHC.TypeNats

Methods

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

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

Eq GeneralCategory

Since: base-2.1

Instance details

Defined in GHC.Unicode

Eq Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Methods

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

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

Eq Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Methods

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

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

Eq Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Methods

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

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

Eq Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Methods

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

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

Eq CBlkCnt 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CBlkSize 
Instance details

Defined in System.Posix.Types

Eq CCc 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CClockId 
Instance details

Defined in System.Posix.Types

Eq CDev 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CFsBlkCnt 
Instance details

Defined in System.Posix.Types

Eq CFsFilCnt 
Instance details

Defined in System.Posix.Types

Eq CGid 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CId 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CIno 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CKey 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CMode 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CNfds 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CNlink 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq COff 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CPid 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CRLim 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CSocklen 
Instance details

Defined in System.Posix.Types

Eq CSpeed 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CSsize 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CTcflag 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CTimer 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CUid 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq Fd 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq Encoding 
Instance details

Defined in Basement.String

Eq ASCII7_Invalid 
Instance details

Defined in Basement.String.Encoding.ASCII7

Methods

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

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

Eq ISO_8859_1_Invalid 
Instance details

Defined in Basement.String.Encoding.ISO_8859_1

Methods

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

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

Eq UTF16_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF16

Methods

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

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

Eq UTF32_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF32

Methods

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

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

Eq FileSize 
Instance details

Defined in Basement.Types.OffsetSize

Eq String 
Instance details

Defined in Basement.UTF8.Base

Methods

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

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

Eq ByteString 
Instance details

Defined in Data.ByteString.Internal

Eq ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Eq ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Eq IntSet 
Instance details

Defined in Data.IntSet.Internal

Methods

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

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

Eq NotFoundException 
Instance details

Defined in Context.Internal

Eq SharedSecret 
Instance details

Defined in Crypto.ECC

Eq CryptoError 
Instance details

Defined in Crypto.Error.Types

Eq ByteArray 
Instance details

Defined in Data.Array.Byte

Eq Error 
Instance details

Defined in Env.Internal.Error

Methods

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

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

Eq LogStr 
Instance details

Defined in System.Log.FastLogger.LogStr

Methods

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

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

Eq BigNat 
Instance details

Defined in GHC.Num.BigNat

Methods

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

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

Eq ForeignSrcLang 
Instance details

Defined in GHC.ForeignSrcLang.Type

Eq Extension 
Instance details

Defined in GHC.LanguageExtensions.Type

Eq Module 
Instance details

Defined in GHC.Classes

Methods

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

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

Eq Ordering 
Instance details

Defined in GHC.Classes

Eq TrName 
Instance details

Defined in GHC.Classes

Methods

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

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

Eq TyCon 
Instance details

Defined in GHC.Classes

Methods

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

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

Eq ConnHost 
Instance details

Defined in Network.HTTP.Client.Types

Eq ConnKey 
Instance details

Defined in Network.HTTP.Client.Types

Methods

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

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

Eq MaxHeaderLength 
Instance details

Defined in Network.HTTP.Client.Types

Eq Proxy 
Instance details

Defined in Network.HTTP.Client.Types

Methods

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

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

Eq ProxySecureMode 
Instance details

Defined in Network.HTTP.Client.Types

Eq ResponseTimeout 
Instance details

Defined in Network.HTTP.Client.Types

Eq StatusHeaders 
Instance details

Defined in Network.HTTP.Client.Types

Eq StreamFileStatus 
Instance details

Defined in Network.HTTP.Client.Types

Eq ByteRange 
Instance details

Defined in Network.HTTP.Types.Header

Eq StdMethod 
Instance details

Defined in Network.HTTP.Types.Method

Eq Status 
Instance details

Defined in Network.HTTP.Types.Status

Methods

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

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

Eq IP

Equality over IP addresses. Correctly compare IPv4 and IPv4-embedded-in-IPv6 addresses.

>>> (read "2001:db8:00:00:00:00:00:01" :: IP) == (read "2001:db8:00:00:00:00:00:01" :: IP)
True
>>> (read "2001:db8:00:00:00:00:00:01" :: IP) == (read "2001:db8:00:00:00:00:00:05" :: IP)
False
>>> (read "127.0.0.1" :: IP) == (read "127.0.0.1" :: IP)
True
>>> (read "127.0.0.1" :: IP) == (read "10.0.0.1" :: IP)
False
>>> (read "::ffff:127.0.0.1" :: IP) == (read "127.0.0.1" :: IP)
True
>>> (read "::ffff:127.0.0.1" :: IP) == (read "127.0.0.9" :: IP)
False
>>> (read "::ffff:127.0.0.1" :: IP) >= (read "127.0.0.1" :: IP)
True
>>> (read "::ffff:127.0.0.1" :: IP) <= (read "127.0.0.1" :: IP)
True
Instance details

Defined in Data.IP.Addr

Methods

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

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

Eq IPv4 
Instance details

Defined in Data.IP.Addr

Methods

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

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

Eq IPv6 
Instance details

Defined in Data.IP.Addr

Methods

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

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

Eq IPRange 
Instance details

Defined in Data.IP.Range

Methods

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

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

Eq LogLevel 
Instance details

Defined in Control.Monad.Logger

Eq LoggedMessage 
Instance details

Defined in Control.Monad.Logger.Aeson.Internal

Eq AddrInfo 
Instance details

Defined in Network.Socket.Info

Eq AddrInfoFlag 
Instance details

Defined in Network.Socket.Info

Eq NameInfoFlag 
Instance details

Defined in Network.Socket.Info

Eq URI 
Instance details

Defined in Network.URI

Methods

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

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

Eq URIAuth 
Instance details

Defined in Network.URI

Methods

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

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

Eq AltNodeType 
Instance details

Defined in Options.Applicative.Types

Eq ArgPolicy 
Instance details

Defined in Options.Applicative.Types

Eq ArgumentReachability 
Instance details

Defined in Options.Applicative.Types

Eq Backtracking 
Instance details

Defined in Options.Applicative.Types

Eq OptName 
Instance details

Defined in Options.Applicative.Types

Methods

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

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

Eq OptVisibility 
Instance details

Defined in Options.Applicative.Types

Eq ParserPrefs 
Instance details

Defined in Options.Applicative.Types

Eq Mode 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

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

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

Eq Style 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

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

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

Eq TextDetails 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Eq Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Methods

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

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

Eq FusionDepth 
Instance details

Defined in Prettyprinter.Internal

Eq LayoutOptions 
Instance details

Defined in Prettyprinter.Internal

Eq PageWidth 
Instance details

Defined in Prettyprinter.Internal

Eq CmdSpec 
Instance details

Defined in System.Process.Common

Methods

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

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

Eq CreateProcess 
Instance details

Defined in System.Process.Common

Eq StdStream 
Instance details

Defined in System.Process.Common

Eq StdGen 
Instance details

Defined in System.Random.Internal

Methods

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

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

Eq RetryAction 
Instance details

Defined in Control.Retry

Eq RetryStatus 
Instance details

Defined in Control.Retry

Eq LogLevel 
Instance details

Defined in RIO.Prelude.Logger

Eq ProcessException 
Instance details

Defined in RIO.Process

Eq Scientific

Scientific numbers can be safely compared for equality. No magnitude 10^e is calculated so there's no risk of a blowup in space or time when comparing scientific numbers coming from untrusted sources.

Instance details

Defined in Data.Scientific

Eq StackId Source # 
Instance details

Defined in Stackctl.AWS.CloudFormation

Methods

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

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

Eq StackName Source # 
Instance details

Defined in Stackctl.AWS.CloudFormation

Eq StackTemplate Source # 
Instance details

Defined in Stackctl.AWS.CloudFormation

Eq AccountId Source # 
Instance details

Defined in Stackctl.AWS.Core

Eq AwsScope Source # 
Instance details

Defined in Stackctl.AWS.Scope

Eq Action Source # 
Instance details

Defined in Stackctl.Action

Methods

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

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

Eq ActionOn Source # 
Instance details

Defined in Stackctl.Action

Eq ActionRun Source # 
Instance details

Defined in Stackctl.Action

Eq RequiredVersion Source # 
Instance details

Defined in Stackctl.Config.RequiredVersion

Eq RequiredVersionOp Source # 
Instance details

Defined in Stackctl.Config.RequiredVersion

Eq DeployConfirmation Source # 
Instance details

Defined in Stackctl.Spec.Deploy

Eq StackDescription Source # 
Instance details

Defined in Stackctl.StackDescription

Eq StackSpecPath Source # 
Instance details

Defined in Stackctl.StackSpecPath

Eq ParameterYaml Source # 
Instance details

Defined in Stackctl.StackSpecYaml

Eq ParametersYaml Source # 
Instance details

Defined in Stackctl.StackSpecYaml

Eq StackSpecYaml Source # 
Instance details

Defined in Stackctl.StackSpecYaml

Eq TagYaml Source # 
Instance details

Defined in Stackctl.StackSpecYaml

Methods

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

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

Eq TagsYaml Source # 
Instance details

Defined in Stackctl.StackSpecYaml

Eq AnnLookup 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq AnnTarget 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Bang 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Body 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Bytes 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Callconv 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Clause 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Con 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Dec 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq DecidedStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq DerivClause 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq DerivStrategy 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq DocLoc 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Exp 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq FamilyResultSig 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Fixity 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq FixityDirection 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Foreign 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq FunDep 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Guard 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Info 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq InjectivityAnn 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Inline 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Lit 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Loc 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Match 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq ModName 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Module 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq ModuleInfo 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Name 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq NameFlavour 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq NameSpace 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq OccName 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Overlap 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Pat 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq PatSynArgs 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq PatSynDir 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Phases 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq PkgName 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Pragma 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Range 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Role 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq RuleBndr 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq RuleMatch 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Safety 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq SourceStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq SourceUnpackedness 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Specificity 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Stmt 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq TyLit 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq TySynEqn 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Type 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq TypeFamilyHead 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq CodePoint 
Instance details

Defined in Data.Text.Encoding

Methods

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

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

Eq DecoderState 
Instance details

Defined in Data.Text.Encoding

Methods

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

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

Eq UnicodeException 
Instance details

Defined in Data.Text.Encoding.Error

Eq B 
Instance details

Defined in Data.Text.Short.Internal

Methods

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

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

Eq ShortText 
Instance details

Defined in Data.Text.Short.Internal

Eq ConstructorInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Eq ConstructorVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Eq DatatypeInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Eq DatatypeVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Eq FieldStrictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Eq Strictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Eq Unpackedness 
Instance details

Defined in Language.Haskell.TH.Datatype

Eq Day 
Instance details

Defined in Data.Time.Calendar.Days

Methods

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

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

Eq AbsoluteTime 
Instance details

Defined in Data.Time.Clock.Internal.AbsoluteTime

Eq DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Eq UTCTime 
Instance details

Defined in Data.Time.Clock.Internal.UTCTime

Methods

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

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

Eq UniversalTime 
Instance details

Defined in Data.Time.Clock.Internal.UniversalTime

Eq TimeLocale 
Instance details

Defined in Data.Time.Format.Locale

Eq LocalTime 
Instance details

Defined in Data.Time.LocalTime.Internal.LocalTime

Eq StringException

Since: unliftio-0.2.19

Instance details

Defined in UnliftIO.Exception

Eq ConcException 
Instance details

Defined in UnliftIO.Internals.Async

Eq UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

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

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

Eq UnpackedUUID 
Instance details

Defined in Data.UUID.Types.Internal

Eq Content 
Instance details

Defined in Data.XML.Types

Methods

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

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

Eq Doctype 
Instance details

Defined in Data.XML.Types

Methods

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

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

Eq Document 
Instance details

Defined in Data.XML.Types

Eq Element 
Instance details

Defined in Data.XML.Types

Methods

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

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

Eq Event 
Instance details

Defined in Data.XML.Types

Methods

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

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

Eq ExternalID 
Instance details

Defined in Data.XML.Types

Eq Instruction 
Instance details

Defined in Data.XML.Types

Eq Miscellaneous 
Instance details

Defined in Data.XML.Types

Eq Name 
Instance details

Defined in Data.XML.Types

Methods

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

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

Eq Node 
Instance details

Defined in Data.XML.Types

Methods

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

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

Eq Prologue 
Instance details

Defined in Data.XML.Types

Eq Warning 
Instance details

Defined in Data.Yaml.Internal

Methods

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

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

Eq CompressionLevel 
Instance details

Defined in Codec.Compression.Zlib.Stream

Eq CompressionStrategy 
Instance details

Defined in Codec.Compression.Zlib.Stream

Eq DictionaryHash 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

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

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

Eq Format 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

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

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

Eq MemoryLevel 
Instance details

Defined in Codec.Compression.Zlib.Stream

Eq Method 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

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

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

Eq WindowBits 
Instance details

Defined in Codec.Compression.Zlib.Stream

Eq Integer 
Instance details

Defined in GHC.Num.Integer

Methods

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

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

Eq Natural 
Instance details

Defined in GHC.Num.Natural

Methods

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

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

Eq () 
Instance details

Defined in GHC.Classes

Methods

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

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

Eq Bool 
Instance details

Defined in GHC.Classes

Methods

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

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

Eq Char 
Instance details

Defined in GHC.Classes

Methods

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

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

Eq Double

Note that due to the presence of NaN, Double's Eq instance does not satisfy reflexivity.

>>> 0/0 == (0/0 :: Double)
False

Also note that Double's Eq instance does not satisfy substitutivity:

>>> 0 == (-0 :: Double)
True
>>> recip 0 == recip (-0 :: Double)
False
Instance details

Defined in GHC.Classes

Methods

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

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

Eq Float

Note that due to the presence of NaN, Float's Eq instance does not satisfy reflexivity.

>>> 0/0 == (0/0 :: Float)
False

Also note that Float's Eq instance does not satisfy extensionality:

>>> 0 == (-0 :: Float)
True
>>> recip 0 == recip (-0 :: Float)
False
Instance details

Defined in GHC.Classes

Methods

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

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

Eq Int 
Instance details

Defined in GHC.Classes

Methods

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

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

Eq Word 
Instance details

Defined in GHC.Classes

Methods

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

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

Eq a => Eq (Blind a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

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

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

Eq a => Eq (Fixed a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

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

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

Eq a => Eq (Large a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

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

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

Eq a => Eq (Negative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

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

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

Eq a => Eq (NonEmptyList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Eq a => Eq (NonNegative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Eq a => Eq (NonPositive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Eq a => Eq (NonZero a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

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

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

Eq a => Eq (OrderedList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Eq a => Eq (Positive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

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

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

Eq a => Eq (Shrink2 a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

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

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

Eq a => Eq (Small a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

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

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

Eq a => Eq (SortedList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

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

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

Eq (Encoding' a) 
Instance details

Defined in Data.Aeson.Encoding.Internal

Methods

(==) :: Encoding' a -> Encoding' a -> Bool #

(/=) :: Encoding' a -> Encoding' a -> Bool #

Eq v => Eq (KeyMap v) 
Instance details

Defined in Data.Aeson.KeyMap

Methods

(==) :: KeyMap v -> KeyMap v -> Bool #

(/=) :: KeyMap v -> KeyMap v -> Bool #

Eq a => Eq (IResult a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

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

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

Eq a => Eq (Result a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

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

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

Eq (Path a) 
Instance details

Defined in Amazonka.Data.Path

Methods

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

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

Eq a => Eq (Sensitive a) 
Instance details

Defined in Amazonka.Data.Sensitive

Methods

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

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

Eq (Time a) 
Instance details

Defined in Amazonka.Data.Time

Methods

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

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

Eq (Async a) 
Instance details

Defined in Control.Concurrent.Async

Methods

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

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

Eq a => Eq (ZipList a)

Since: base-4.7.0.0

Instance details

Defined in Control.Applicative

Methods

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

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

Eq (Chan a)

Since: base-4.4.0.0

Instance details

Defined in Control.Concurrent.Chan

Methods

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

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

Eq a => Eq (Complex a)

Since: base-2.1

Instance details

Defined in Data.Complex

Methods

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

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

Eq a => Eq (Identity a)

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

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

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

Eq a => Eq (First a)

Since: base-2.1

Instance details

Defined in Data.Monoid

Methods

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

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

Eq a => Eq (Last a)

Since: base-2.1

Instance details

Defined in Data.Monoid

Methods

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

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

Eq a => Eq (Down a)

Since: base-4.6.0.0

Instance details

Defined in Data.Ord

Methods

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

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

Eq a => Eq (First a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

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

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

Eq a => Eq (Last a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

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

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

Eq a => Eq (Max a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

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

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

Eq a => Eq (Min a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

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

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

Eq m => Eq (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Eq a => Eq (Dual a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

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

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

Eq a => Eq (Product a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

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

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

Eq a => Eq (Sum a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

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

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

Eq (TVar a)

Since: base-4.8.0.0

Instance details

Defined in GHC.Conc.Sync

Methods

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

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

Eq (ForeignPtr a)

Since: base-2.1

Instance details

Defined in GHC.ForeignPtr

Methods

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

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

Eq p => Eq (Par1 p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: Par1 p -> Par1 p -> Bool #

(/=) :: Par1 p -> Par1 p -> Bool #

Eq (IORef a)

Pointer equality.

Since: base-4.0.0.0

Instance details

Defined in GHC.IORef

Methods

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

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

Eq (MVar a)

Since: base-4.1.0.0

Instance details

Defined in GHC.MVar

Methods

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

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

Eq (FunPtr a) 
Instance details

Defined in GHC.Ptr

Methods

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

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

Eq (Ptr a)

Since: base-2.1

Instance details

Defined in GHC.Ptr

Methods

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

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

Eq a => Eq (Ratio a)

Since: base-2.1

Instance details

Defined in GHC.Real

Methods

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

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

Eq (Bits n) 
Instance details

Defined in Basement.Bits

Methods

(==) :: Bits n -> Bits n -> Bool #

(/=) :: Bits n -> Bits n -> Bool #

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

Defined in Basement.Block.Base

Methods

(==) :: Block ty -> Block ty -> Bool #

(/=) :: Block ty -> Block ty -> Bool #

Eq (Zn n) 
Instance details

Defined in Basement.Bounded

Methods

(==) :: Zn n -> Zn n -> Bool #

(/=) :: Zn n -> Zn n -> Bool #

Eq (Zn64 n) 
Instance details

Defined in Basement.Bounded

Methods

(==) :: Zn64 n -> Zn64 n -> Bool #

(/=) :: Zn64 n -> Zn64 n -> Bool #

Eq a => Eq (NonEmpty a) 
Instance details

Defined in Basement.NonEmpty

Methods

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

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

Eq (CountOf ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

(==) :: CountOf ty -> CountOf ty -> Bool #

(/=) :: CountOf ty -> CountOf ty -> Bool #

Eq (Offset ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

(==) :: Offset ty -> Offset ty -> Bool #

(/=) :: Offset ty -> Offset ty -> Bool #

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

Defined in Basement.UArray.Base

Methods

(==) :: UArray ty -> UArray ty -> Bool #

(/=) :: UArray ty -> UArray ty -> Bool #

Eq a => Eq (Flush a) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

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

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

Eq vertex => Eq (SCC vertex)

Since: containers-0.5.9

Instance details

Defined in Data.Graph

Methods

(==) :: SCC vertex -> SCC vertex -> Bool #

(/=) :: SCC vertex -> SCC vertex -> Bool #

Eq a => Eq (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

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

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

Eq a => Eq (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

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

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

Eq a => Eq (ViewL a) 
Instance details

Defined in Data.Sequence.Internal

Methods

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

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

Eq a => Eq (ViewR a) 
Instance details

Defined in Data.Sequence.Internal

Methods

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

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

Eq a => Eq (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

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

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

Eq a => Eq (Tree a) 
Instance details

Defined in Data.Tree

Methods

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

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

Eq a => Eq (CryptoFailable a) 
Instance details

Defined in Crypto.Error.Types

Eq (Digest a) 
Instance details

Defined in Crypto.Hash.Types

Methods

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

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

Eq (MutableByteArray s) 
Instance details

Defined in Data.Array.Byte

Eq1 f => Eq (Fix f) 
Instance details

Defined in Data.Fix

Methods

(==) :: Fix f -> Fix f -> Bool #

(/=) :: Fix f -> Fix f -> Bool #

(Functor f, Eq1 f) => Eq (Mu f) 
Instance details

Defined in Data.Fix

Methods

(==) :: Mu f -> Mu f -> Bool #

(/=) :: Mu f -> Mu f -> Bool #

(Functor f, Eq1 f) => Eq (Nu f) 
Instance details

Defined in Data.Fix

Methods

(==) :: Nu f -> Nu f -> Bool #

(/=) :: Nu f -> Nu f -> Bool #

Eq a => Eq (DNonEmpty a) 
Instance details

Defined in Data.DList.DNonEmpty.Internal

Methods

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

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

Eq a => Eq (DList a) 
Instance details

Defined in Data.DList.Internal

Methods

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

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

Eq a => Eq (Hashed a)

Uses precomputed hash to detect inequality faster

Instance details

Defined in Data.Hashable.Class

Methods

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

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

Eq a => Eq (AddrRange a) 
Instance details

Defined in Data.IP.Range

Methods

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

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

Eq mono => Eq (NonNull mono) 
Instance details

Defined in Data.NonNull

Methods

(==) :: NonNull mono -> NonNull mono -> Bool #

(/=) :: NonNull mono -> NonNull mono -> Bool #

Eq a => Eq (AnnotDetails a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Eq (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

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

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

Eq a => Eq (Span a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

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

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

Eq ann => Eq (SimpleDocStream ann) 
Instance details

Defined in Prettyprinter.Internal

Eq a => Eq (Array a) 
Instance details

Defined in Data.Primitive.Array

Methods

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

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

(Eq a, Prim a) => Eq (PrimArray a)

Since: primitive-0.6.4.0

Instance details

Defined in Data.Primitive.PrimArray

Methods

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

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

Eq a => Eq (SmallArray a) 
Instance details

Defined in Data.Primitive.SmallArray

Methods

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

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

Eq g => Eq (StateGen g) 
Instance details

Defined in System.Random.Internal

Methods

(==) :: StateGen g -> StateGen g -> Bool #

(/=) :: StateGen g -> StateGen g -> Bool #

Eq g => Eq (AtomicGen g) 
Instance details

Defined in System.Random.Stateful

Methods

(==) :: AtomicGen g -> AtomicGen g -> Bool #

(/=) :: AtomicGen g -> AtomicGen g -> Bool #

Eq g => Eq (IOGen g) 
Instance details

Defined in System.Random.Stateful

Methods

(==) :: IOGen g -> IOGen g -> Bool #

(/=) :: IOGen g -> IOGen g -> Bool #

Eq g => Eq (STGen g) 
Instance details

Defined in System.Random.Stateful

Methods

(==) :: STGen g -> STGen g -> Bool #

(/=) :: STGen g -> STGen g -> Bool #

Eq g => Eq (TGen g) 
Instance details

Defined in System.Random.Stateful

Methods

(==) :: TGen g -> TGen g -> Bool #

(/=) :: TGen g -> TGen g -> Bool #

Eq a => Eq (OneOrListOf a) Source # 
Instance details

Defined in Stackctl.OneOrListOf

Eq (TBQueue a) 
Instance details

Defined in Control.Concurrent.STM.TBQueue

Methods

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

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

Eq (TChan a) 
Instance details

Defined in Control.Concurrent.STM.TChan

Methods

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

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

Eq (TMVar a) 
Instance details

Defined in Control.Concurrent.STM.TMVar

Methods

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

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

Eq (TQueue a) 
Instance details

Defined in Control.Concurrent.STM.TQueue

Methods

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

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

Eq a => Eq (Maybe a) 
Instance details

Defined in Data.Strict.Maybe

Methods

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

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

Eq flag => Eq (TyVarBndr flag) 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: TyVarBndr flag -> TyVarBndr flag -> Bool #

(/=) :: TyVarBndr flag -> TyVarBndr flag -> Bool #

Eq a => Eq (HashSet a)

Note that, in the presence of hash collisions, equal HashSets may behave differently, i.e. substitutivity may be violated:

>>> data D = A | B deriving (Eq, Show)
>>> instance Hashable D where hashWithSalt salt _d = salt
>>> x = fromList [A, B]
>>> y = fromList [B, A]
>>> x == y
True
>>> toList x
[A,B]
>>> toList y
[B,A]

In general, the lack of substitutivity can be observed with any function that depends on the key ordering, such as folds and traversals.

Instance details

Defined in Data.HashSet.Internal

Methods

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

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

Eq a => Eq (Vector a) 
Instance details

Defined in Data.Vector

Methods

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

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

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

Defined in Data.Vector.Primitive

Methods

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

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

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

Defined in Data.Vector.Storable

Methods

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

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

Eq a => Eq (NonEmpty a)

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

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

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

Eq a => Eq (Maybe a)

Since: base-2.1

Instance details

Defined in GHC.Maybe

Methods

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

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

Eq a => Eq (a) 
Instance details

Defined in GHC.Classes

Methods

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

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

Eq a => Eq [a] 
Instance details

Defined in GHC.Classes

Methods

(==) :: [a] -> [a] -> Bool #

(/=) :: [a] -> [a] -> Bool #

(Eq a, Eq b) => Eq (Either a b)

Since: base-2.1

Instance details

Defined in Data.Either

Methods

(==) :: Either a b -> Either a b -> Bool #

(/=) :: Either a b -> Either a b -> Bool #

Eq (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

(==) :: Proxy s -> Proxy s -> Bool #

(/=) :: Proxy s -> Proxy s -> Bool #

Eq a => Eq (Arg a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(==) :: Arg a b -> Arg a b -> Bool #

(/=) :: Arg a b -> Arg a b -> Bool #

Eq (TypeRep a)

Since: base-2.1

Instance details

Defined in Data.Typeable.Internal

Methods

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

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

(Ix i, Eq e) => Eq (Array i e)

Since: base-2.1

Instance details

Defined in GHC.Arr

Methods

(==) :: Array i e -> Array i e -> Bool #

(/=) :: Array i e -> Array i e -> Bool #

Eq (U1 p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: U1 p -> U1 p -> Bool #

(/=) :: U1 p -> U1 p -> Bool #

Eq (V1 p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: V1 p -> V1 p -> Bool #

(/=) :: V1 p -> V1 p -> Bool #

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

Defined in Data.Map.Internal

Methods

(==) :: Map k a -> Map k a -> Bool #

(/=) :: Map k a -> Map k a -> Bool #

(Eq1 f, Eq a) => Eq (Cofree f a) 
Instance details

Defined in Control.Comonad.Cofree

Methods

(==) :: Cofree f a -> Cofree f a -> Bool #

(/=) :: Cofree f a -> Cofree f a -> Bool #

(Eq1 f, Eq a) => Eq (Free f a) 
Instance details

Defined in Control.Monad.Free

Methods

(==) :: Free f a -> Free f a -> Bool #

(/=) :: Free f a -> Free f a -> Bool #

(Eq1 f, Eq a) => Eq (Yoneda f a) 
Instance details

Defined in Data.Functor.Yoneda

Methods

(==) :: Yoneda f a -> Yoneda f a -> Bool #

(/=) :: Yoneda f a -> Yoneda f a -> Bool #

Eq (MutableArray s a) 
Instance details

Defined in Data.Primitive.Array

Methods

(==) :: MutableArray s a -> MutableArray s a -> Bool #

(/=) :: MutableArray s a -> MutableArray s a -> Bool #

Eq (MutablePrimArray s a) 
Instance details

Defined in Data.Primitive.PrimArray

Eq (SmallMutableArray s a) 
Instance details

Defined in Data.Primitive.SmallArray

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

Defined in Data.Strict.Either

Methods

(==) :: Either a b -> Either a b -> Bool #

(/=) :: Either a b -> Either a b -> Bool #

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

Defined in Data.Strict.These

Methods

(==) :: These a b -> These a b -> Bool #

(/=) :: These a b -> These a b -> Bool #

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

Defined in Data.Strict.Tuple

Methods

(==) :: Pair a b -> Pair a b -> Bool #

(/=) :: Pair a b -> Pair a b -> Bool #

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

Defined in Data.These

Methods

(==) :: These a b -> These a b -> Bool #

(/=) :: These a b -> These a b -> Bool #

(Eq1 f, Eq a) => Eq (Lift f a) 
Instance details

Defined in Control.Applicative.Lift

Methods

(==) :: Lift f a -> Lift f a -> Bool #

(/=) :: Lift f a -> Lift f a -> Bool #

(Eq1 m, Eq a) => Eq (ListT m a) 
Instance details

Defined in Control.Monad.Trans.List

Methods

(==) :: ListT m a -> ListT m a -> Bool #

(/=) :: ListT m a -> ListT m a -> Bool #

(Eq1 m, Eq a) => Eq (MaybeT m a) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

(==) :: MaybeT m a -> MaybeT m a -> Bool #

(/=) :: MaybeT m a -> MaybeT m a -> Bool #

(Eq k, Eq v) => Eq (HashMap k v)

Note that, in the presence of hash collisions, equal HashMaps may behave differently, i.e. substitutivity may be violated:

>>> data D = A | B deriving (Eq, Show)
>>> instance Hashable D where hashWithSalt salt _d = salt
>>> x = fromList [(A,1), (B,2)]
>>> y = fromList [(B,2), (A,1)]
>>> x == y
True
>>> toList x
[(A,1),(B,2)]
>>> toList y
[(B,2),(A,1)]

In general, the lack of substitutivity can be observed with any function that depends on the key ordering, such as folds and traversals.

Instance details

Defined in Data.HashMap.Internal

Methods

(==) :: HashMap k v -> HashMap k v -> Bool #

(/=) :: HashMap k v -> HashMap k v -> Bool #

(Eq k, Eq v) => Eq (Leaf k v) 
Instance details

Defined in Data.HashMap.Internal

Methods

(==) :: Leaf k v -> Leaf k v -> Bool #

(/=) :: Leaf k v -> Leaf k v -> Bool #

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

Defined in GHC.Classes

Methods

(==) :: (a, b) -> (a, b) -> Bool #

(/=) :: (a, b) -> (a, b) -> Bool #

Eq a => Eq (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

(==) :: Const a b -> Const a b -> Bool #

(/=) :: Const a b -> Const a b -> Bool #

Eq (f a) => Eq (Ap f a)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

(==) :: Ap f a -> Ap f a -> Bool #

(/=) :: Ap f a -> Ap f a -> Bool #

Eq (f a) => Eq (Alt f a)

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

(==) :: Alt f a -> Alt f a -> Bool #

(/=) :: Alt f a -> Alt f a -> Bool #

Eq (a :~: b)

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Equality

Methods

(==) :: (a :~: b) -> (a :~: b) -> Bool #

(/=) :: (a :~: b) -> (a :~: b) -> Bool #

Eq (OrderingI a b) 
Instance details

Defined in Data.Type.Ord

Methods

(==) :: OrderingI a b -> OrderingI a b -> Bool #

(/=) :: OrderingI a b -> OrderingI a b -> Bool #

Eq (STArray s i e)

Since: base-2.1

Instance details

Defined in GHC.Arr

Methods

(==) :: STArray s i e -> STArray s i e -> Bool #

(/=) :: STArray s i e -> STArray s i e -> Bool #

Eq (f p) => Eq (Rec1 f p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: Rec1 f p -> Rec1 f p -> Bool #

(/=) :: Rec1 f p -> Rec1 f p -> Bool #

Eq (URec (Ptr ()) p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool #

(/=) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool #

Eq (URec Char p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: URec Char p -> URec Char p -> Bool #

(/=) :: URec Char p -> URec Char p -> Bool #

Eq (URec Double p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: URec Double p -> URec Double p -> Bool #

(/=) :: URec Double p -> URec Double p -> Bool #

Eq (URec Float p) 
Instance details

Defined in GHC.Generics

Methods

(==) :: URec Float p -> URec Float p -> Bool #

(/=) :: URec Float p -> URec Float p -> Bool #

Eq (URec Int p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: URec Int p -> URec Int p -> Bool #

(/=) :: URec Int p -> URec Int p -> Bool #

Eq (URec Word p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: URec Word p -> URec Word p -> Bool #

(/=) :: URec Word p -> URec Word p -> Bool #

Eq (p (Fix p a) a) => Eq (Fix p a) 
Instance details

Defined in Data.Bifunctor.Fix

Methods

(==) :: Fix p a -> Fix p a -> Bool #

(/=) :: Fix p a -> Fix p a -> Bool #

Eq (p a a) => Eq (Join p a) 
Instance details

Defined in Data.Bifunctor.Join

Methods

(==) :: Join p a -> Join p a -> Bool #

(/=) :: Join p a -> Join p a -> Bool #

(Eq a, Eq (f b)) => Eq (CofreeF f a b) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

(==) :: CofreeF f a b -> CofreeF f a b -> Bool #

(/=) :: CofreeF f a b -> CofreeF f a b -> Bool #

Eq (w (CofreeF f a (CofreeT f w a))) => Eq (CofreeT f w a) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

(==) :: CofreeT f w a -> CofreeT f w a -> Bool #

(/=) :: CofreeT f w a -> CofreeT f w a -> Bool #

(Eq a, Eq (f b)) => Eq (FreeF f a b) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

(==) :: FreeF f a b -> FreeF f a b -> Bool #

(/=) :: FreeF f a b -> FreeF f a b -> Bool #

(Eq1 f, Eq1 m, Eq a) => Eq (FreeT f m a) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

(==) :: FreeT f m a -> FreeT f m a -> Bool #

(/=) :: FreeT f m a -> FreeT f m a -> Bool #

Eq b => Eq (Tagged s b) 
Instance details

Defined in Data.Tagged

Methods

(==) :: Tagged s b -> Tagged s b -> Bool #

(/=) :: Tagged s b -> Tagged s b -> Bool #

(Eq (f a), Eq (g a), Eq a) => Eq (These1 f g a) 
Instance details

Defined in Data.Functor.These

Methods

(==) :: These1 f g a -> These1 f g a -> Bool #

(/=) :: These1 f g a -> These1 f g a -> Bool #

(Eq1 f, Eq a) => Eq (Backwards f a) 
Instance details

Defined in Control.Applicative.Backwards

Methods

(==) :: Backwards f a -> Backwards f a -> Bool #

(/=) :: Backwards f a -> Backwards f a -> Bool #

(Eq e, Eq1 m, Eq a) => Eq (ErrorT e m a) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

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

(/=) :: ErrorT e m a -> ErrorT e m a -> Bool #

(Eq e, Eq1 m, Eq a) => Eq (ExceptT e m a) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

(==) :: ExceptT e m a -> ExceptT e m a -> Bool #

(/=) :: ExceptT e m a -> ExceptT e m a -> Bool #

(Eq1 f, Eq a) => Eq (IdentityT f a) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

(==) :: IdentityT f a -> IdentityT f a -> Bool #

(/=) :: IdentityT f a -> IdentityT f a -> Bool #

(Eq w, Eq1 m, Eq a) => Eq (WriterT w m a) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

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

(/=) :: WriterT w m a -> WriterT w m a -> Bool #

(Eq w, Eq1 m, Eq a) => Eq (WriterT w m a) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

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

(/=) :: WriterT w m a -> WriterT w m a -> Bool #

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

Defined in Data.Functor.Constant

Methods

(==) :: Constant a b -> Constant a b -> Bool #

(/=) :: Constant a b -> Constant a b -> Bool #

(Eq1 f, Eq a) => Eq (Reverse f a) 
Instance details

Defined in Data.Functor.Reverse

Methods

(==) :: Reverse f a -> Reverse f a -> Bool #

(/=) :: Reverse f a -> Reverse f a -> Bool #

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

Defined in GHC.Classes

Methods

(==) :: (a, b, c) -> (a, b, c) -> Bool #

(/=) :: (a, b, c) -> (a, b, c) -> Bool #

(Eq1 f, Eq1 g, Eq a) => Eq (Product f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Product

Methods

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

(/=) :: Product f g a -> Product f g a -> Bool #

(Eq1 f, Eq1 g, Eq a) => Eq (Sum f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Sum

Methods

(==) :: Sum f g a -> Sum f g a -> Bool #

(/=) :: Sum f g a -> Sum f g a -> Bool #

Eq (a :~~: b)

Since: base-4.10.0.0

Instance details

Defined in Data.Type.Equality

Methods

(==) :: (a :~~: b) -> (a :~~: b) -> Bool #

(/=) :: (a :~~: b) -> (a :~~: b) -> Bool #

(Eq (f p), Eq (g p)) => Eq ((f :*: g) p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: (f :*: g) p -> (f :*: g) p -> Bool #

(/=) :: (f :*: g) p -> (f :*: g) p -> Bool #

(Eq (f p), Eq (g p)) => Eq ((f :+: g) p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: (f :+: g) p -> (f :+: g) p -> Bool #

(/=) :: (f :+: g) p -> (f :+: g) p -> Bool #

Eq c => Eq (K1 i c p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: K1 i c p -> K1 i c p -> Bool #

(/=) :: K1 i c p -> K1 i c p -> Bool #

(Eq a, Eq b, Eq c, Eq d) => Eq (a, b, c, d) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d) -> (a, b, c, d) -> Bool #

(/=) :: (a, b, c, d) -> (a, b, c, d) -> Bool #

(Eq1 f, Eq1 g, Eq a) => Eq (Compose f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

(==) :: Compose f g a -> Compose f g a -> Bool #

(/=) :: Compose f g a -> Compose f g a -> Bool #

Eq (f (g p)) => Eq ((f :.: g) p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: (f :.: g) p -> (f :.: g) p -> Bool #

(/=) :: (f :.: g) p -> (f :.: g) p -> Bool #

Eq (f p) => Eq (M1 i c f p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: M1 i c f p -> M1 i c f p -> Bool #

(/=) :: M1 i c f p -> M1 i c f p -> Bool #

Eq (f a) => Eq (Clown f a b) 
Instance details

Defined in Data.Bifunctor.Clown

Methods

(==) :: Clown f a b -> Clown f a b -> Bool #

(/=) :: Clown f a b -> Clown f a b -> Bool #

Eq (p b a) => Eq (Flip p a b) 
Instance details

Defined in Data.Bifunctor.Flip

Methods

(==) :: Flip p a b -> Flip p a b -> Bool #

(/=) :: Flip p a b -> Flip p a b -> Bool #

Eq (g b) => Eq (Joker g a b) 
Instance details

Defined in Data.Bifunctor.Joker

Methods

(==) :: Joker g a b -> Joker g a b -> Bool #

(/=) :: Joker g a b -> Joker g a b -> Bool #

Eq (p a b) => Eq (WrappedBifunctor p a b) 
Instance details

Defined in Data.Bifunctor.Wrapped

Methods

(==) :: WrappedBifunctor p a b -> WrappedBifunctor p a b -> Bool #

(/=) :: WrappedBifunctor p a b -> WrappedBifunctor p a b -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e) => Eq (a, b, c, d, e) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e) -> (a, b, c, d, e) -> Bool #

(/=) :: (a, b, c, d, e) -> (a, b, c, d, e) -> Bool #

(Eq (f a b), Eq (g a b)) => Eq (Product f g a b) 
Instance details

Defined in Data.Bifunctor.Product

Methods

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

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

(Eq (p a b), Eq (q a b)) => Eq (Sum p q a b) 
Instance details

Defined in Data.Bifunctor.Sum

Methods

(==) :: Sum p q a b -> Sum p q a b -> Bool #

(/=) :: Sum p q a b -> Sum p q a b -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f) => Eq (a, b, c, d, e, f) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> Bool #

(/=) :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> Bool #

Eq (f (p a b)) => Eq (Tannen f p a b) 
Instance details

Defined in Data.Bifunctor.Tannen

Methods

(==) :: Tannen f p a b -> Tannen f p a b -> Bool #

(/=) :: Tannen f p a b -> Tannen f p a b -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g) => Eq (a, b, c, d, e, f, g) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> Bool #

(/=) :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h) => Eq (a, b, c, d, e, f, g, h) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> Bool #

(/=) :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> Bool #

Eq (p (f a) (g b)) => Eq (Biff p f g a b) 
Instance details

Defined in Data.Bifunctor.Biff

Methods

(==) :: Biff p f g a b -> Biff p f g a b -> Bool #

(/=) :: Biff p f g a b -> Biff p f g a b -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i) => Eq (a, b, c, d, e, f, g, h, i) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> Bool #

(/=) :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j) => Eq (a, b, c, d, e, f, g, h, i, j) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> Bool #

(/=) :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j, Eq k) => Eq (a, b, c, d, e, f, g, h, i, j, k) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> Bool #

(/=) :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j, Eq k, Eq l) => Eq (a, b, c, d, e, f, g, h, i, j, k, l) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> Bool #

(/=) :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j, Eq k, Eq l, Eq m) => Eq (a, b, c, d, e, f, g, h, i, j, k, l, m) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Bool #

(/=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j, Eq k, Eq l, Eq m, Eq n) => Eq (a, b, c, d, e, f, g, h, i, j, k, l, m, n) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Bool #

(/=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j, Eq k, Eq l, Eq m, Eq n, Eq o) => Eq (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Bool #

(/=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Bool #

class Fractional a => Floating a where #

Trigonometric and hyperbolic functions and related functions.

The Haskell Report defines no laws for Floating. However, (+), (*) and exp are customarily expected to define an exponential field and have the following properties:

  • exp (a + b) = exp a * exp b
  • exp (fromInteger 0) = fromInteger 1

Minimal complete definition

pi, exp, log, sin, cos, asin, acos, atan, sinh, cosh, asinh, acosh, atanh

Methods

pi :: a #

exp :: a -> a #

log :: a -> a #

sqrt :: a -> a #

(**) :: a -> a -> a infixr 8 #

logBase :: a -> a -> a #

sin :: a -> a #

cos :: a -> a #

tan :: a -> a #

asin :: a -> a #

acos :: a -> a #

atan :: a -> a #

sinh :: a -> a #

cosh :: a -> a #

tanh :: a -> a #

asinh :: a -> a #

acosh :: a -> a #

atanh :: a -> a #

Instances

Instances details
Floating CDouble 
Instance details

Defined in Foreign.C.Types

Floating CFloat 
Instance details

Defined in Foreign.C.Types

Floating Double

Since: base-2.1

Instance details

Defined in GHC.Float

Floating Float

Since: base-2.1

Instance details

Defined in GHC.Float

RealFloat a => Floating (Complex a)

Since: base-2.1

Instance details

Defined in Data.Complex

Methods

pi :: Complex a #

exp :: Complex a -> Complex a #

log :: Complex a -> Complex a #

sqrt :: Complex a -> Complex a #

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

logBase :: Complex a -> Complex a -> Complex a #

sin :: Complex a -> Complex a #

cos :: Complex a -> Complex a #

tan :: Complex a -> Complex a #

asin :: Complex a -> Complex a #

acos :: Complex a -> Complex a #

atan :: Complex a -> Complex a #

sinh :: Complex a -> Complex a #

cosh :: Complex a -> Complex a #

tanh :: Complex a -> Complex a #

asinh :: Complex a -> Complex a #

acosh :: Complex a -> Complex a #

atanh :: Complex a -> Complex a #

log1p :: Complex a -> Complex a #

expm1 :: Complex a -> Complex a #

log1pexp :: Complex a -> Complex a #

log1mexp :: Complex a -> Complex a #

Floating a => Floating (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Floating a => Floating (Down a)

Since: base-4.14.0.0

Instance details

Defined in Data.Ord

Methods

pi :: Down a #

exp :: Down a -> Down a #

log :: Down a -> Down a #

sqrt :: Down a -> Down a #

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

logBase :: Down a -> Down a -> Down a #

sin :: Down a -> Down a #

cos :: Down a -> Down a #

tan :: Down a -> Down a #

asin :: Down a -> Down a #

acos :: Down a -> Down a #

atan :: Down a -> Down a #

sinh :: Down a -> Down a #

cosh :: Down a -> Down a #

tanh :: Down a -> Down a #

asinh :: Down a -> Down a #

acosh :: Down a -> Down a #

atanh :: Down a -> Down a #

log1p :: Down a -> Down a #

expm1 :: Down a -> Down a #

log1pexp :: Down a -> Down a #

log1mexp :: Down a -> Down a #

Floating a => Floating (Op a b) 
Instance details

Defined in Data.Functor.Contravariant

Methods

pi :: Op a b #

exp :: Op a b -> Op a b #

log :: Op a b -> Op a b #

sqrt :: Op a b -> Op a b #

(**) :: Op a b -> Op a b -> Op a b #

logBase :: Op a b -> Op a b -> Op a b #

sin :: Op a b -> Op a b #

cos :: Op a b -> Op a b #

tan :: Op a b -> Op a b #

asin :: Op a b -> Op a b #

acos :: Op a b -> Op a b #

atan :: Op a b -> Op a b #

sinh :: Op a b -> Op a b #

cosh :: Op a b -> Op a b #

tanh :: Op a b -> Op a b #

asinh :: Op a b -> Op a b #

acosh :: Op a b -> Op a b #

atanh :: Op a b -> Op a b #

log1p :: Op a b -> Op a b #

expm1 :: Op a b -> Op a b #

log1pexp :: Op a b -> Op a b #

log1mexp :: Op a b -> Op a b #

Floating a => Floating (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

pi :: Const a b #

exp :: Const a b -> Const a b #

log :: Const a b -> Const a b #

sqrt :: Const a b -> Const a b #

(**) :: Const a b -> Const a b -> Const a b #

logBase :: Const a b -> Const a b -> Const a b #

sin :: Const a b -> Const a b #

cos :: Const a b -> Const a b #

tan :: Const a b -> Const a b #

asin :: Const a b -> Const a b #

acos :: Const a b -> Const a b #

atan :: Const a b -> Const a b #

sinh :: Const a b -> Const a b #

cosh :: Const a b -> Const a b #

tanh :: Const a b -> Const a b #

asinh :: Const a b -> Const a b #

acosh :: Const a b -> Const a b #

atanh :: Const a b -> Const a b #

log1p :: Const a b -> Const a b #

expm1 :: Const a b -> Const a b #

log1pexp :: Const a b -> Const a b #

log1mexp :: Const a b -> Const a b #

Floating a => Floating (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

pi :: Tagged s a #

exp :: Tagged s a -> Tagged s a #

log :: Tagged s a -> Tagged s a #

sqrt :: Tagged s a -> Tagged s a #

(**) :: Tagged s a -> Tagged s a -> Tagged s a #

logBase :: Tagged s a -> Tagged s a -> Tagged s a #

sin :: Tagged s a -> Tagged s a #

cos :: Tagged s a -> Tagged s a #

tan :: Tagged s a -> Tagged s a #

asin :: Tagged s a -> Tagged s a #

acos :: Tagged s a -> Tagged s a #

atan :: Tagged s a -> Tagged s a #

sinh :: Tagged s a -> Tagged s a #

cosh :: Tagged s a -> Tagged s a #

tanh :: Tagged s a -> Tagged s a #

asinh :: Tagged s a -> Tagged s a #

acosh :: Tagged s a -> Tagged s a #

atanh :: Tagged s a -> Tagged s a #

log1p :: Tagged s a -> Tagged s a #

expm1 :: Tagged s a -> Tagged s a #

log1pexp :: Tagged s a -> Tagged s a #

log1mexp :: Tagged s a -> Tagged s a #

class Num a => Fractional a where #

Fractional numbers, supporting real division.

The Haskell Report defines no laws for Fractional. However, (+) and (*) are customarily expected to define a division ring and have the following properties:

recip gives the multiplicative inverse
x * recip x = recip x * x = fromInteger 1

Note that it isn't customarily expected that a type instance of Fractional implement a field. However, all instances in base do.

Minimal complete definition

fromRational, (recip | (/))

Methods

(/) :: a -> a -> a infixl 7 #

Fractional division.

recip :: a -> a #

Reciprocal fraction.

fromRational :: Rational -> a #

Conversion from a Rational (that is Ratio Integer). A floating literal stands for an application of fromRational to a value of type Rational, so such literals have type (Fractional a) => a.

Instances

Instances details
Fractional CDouble 
Instance details

Defined in Foreign.C.Types

Fractional CFloat 
Instance details

Defined in Foreign.C.Types

Fractional Scientific

WARNING: recip and / will throw an error when their outputs are repeating decimals.

These methods also compute Integer magnitudes (10^e). If these methods are applied to arguments which have huge exponents this could fill up all space and crash your program! So don't apply these methods to scientific numbers coming from untrusted sources.

fromRational will throw an error when the input Rational is a repeating decimal. Consider using fromRationalRepetend for these rationals which will detect the repetition and indicate where it starts.

Instance details

Defined in Data.Scientific

Fractional DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

RealFloat a => Fractional (Complex a)

Since: base-2.1

Instance details

Defined in Data.Complex

Methods

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

recip :: Complex a -> Complex a #

fromRational :: Rational -> Complex a #

Fractional a => Fractional (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Fractional a => Fractional (Down a)

Since: base-4.14.0.0

Instance details

Defined in Data.Ord

Methods

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

recip :: Down a -> Down a #

fromRational :: Rational -> Down a #

Integral a => Fractional (Ratio a)

Since: base-2.0.1

Instance details

Defined in GHC.Real

Methods

(/) :: Ratio a -> Ratio a -> Ratio a #

recip :: Ratio a -> Ratio a #

fromRational :: Rational -> Ratio a #

Fractional a => Fractional (Op a b) 
Instance details

Defined in Data.Functor.Contravariant

Methods

(/) :: Op a b -> Op a b -> Op a b #

recip :: Op a b -> Op a b #

fromRational :: Rational -> Op a b #

Fractional a => Fractional (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

(/) :: Const a b -> Const a b -> Const a b #

recip :: Const a b -> Const a b #

fromRational :: Rational -> Const a b #

Fractional a => Fractional (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

(/) :: Tagged s a -> Tagged s a -> Tagged s a #

recip :: Tagged s a -> Tagged s a #

fromRational :: Rational -> Tagged s a #

class (Real a, Enum a) => Integral a where #

Integral numbers, supporting integer division.

The Haskell Report defines no laws for Integral. However, Integral instances are customarily expected to define a Euclidean domain and have the following properties for the div/mod and quot/rem pairs, given suitable Euclidean functions f and g:

  • x = y * quot x y + rem x y with rem x y = fromInteger 0 or g (rem x y) < g y
  • x = y * div x y + mod x y with mod x y = fromInteger 0 or f (mod x y) < f y

An example of a suitable Euclidean function, for Integer's instance, is abs.

Minimal complete definition

quotRem, toInteger

Methods

quot :: a -> a -> a infixl 7 #

integer division truncated toward zero

rem :: a -> a -> a infixl 7 #

integer remainder, satisfying

(x `quot` y)*y + (x `rem` y) == x

div :: a -> a -> a infixl 7 #

integer division truncated toward negative infinity

mod :: a -> a -> a infixl 7 #

integer modulus, satisfying

(x `div` y)*y + (x `mod` y) == x

quotRem :: a -> a -> (a, a) #

simultaneous quot and rem

divMod :: a -> a -> (a, a) #

simultaneous div and mod

toInteger :: a -> Integer #

conversion to Integer

Instances

Instances details
Integral ChunkSize 
Instance details

Defined in Amazonka.Data.Body

Integral CBool 
Instance details

Defined in Foreign.C.Types

Integral CChar 
Instance details

Defined in Foreign.C.Types

Integral CInt 
Instance details

Defined in Foreign.C.Types

Methods

quot :: CInt -> CInt -> CInt #

rem :: CInt -> CInt -> CInt #

div :: CInt -> CInt -> CInt #

mod :: CInt -> CInt -> CInt #

quotRem :: CInt -> CInt -> (CInt, CInt) #

divMod :: CInt -> CInt -> (CInt, CInt) #

toInteger :: CInt -> Integer #

Integral CIntMax 
Instance details

Defined in Foreign.C.Types

Integral CIntPtr 
Instance details

Defined in Foreign.C.Types

Integral CLLong 
Instance details

Defined in Foreign.C.Types

Integral CLong 
Instance details

Defined in Foreign.C.Types

Integral CPtrdiff 
Instance details

Defined in Foreign.C.Types

Integral CSChar 
Instance details

Defined in Foreign.C.Types

Integral CShort 
Instance details

Defined in Foreign.C.Types

Integral CSigAtomic 
Instance details

Defined in Foreign.C.Types

Integral CSize 
Instance details

Defined in Foreign.C.Types

Integral CUChar 
Instance details

Defined in Foreign.C.Types

Integral CUInt 
Instance details

Defined in Foreign.C.Types

Integral CUIntMax 
Instance details

Defined in Foreign.C.Types

Integral CUIntPtr 
Instance details

Defined in Foreign.C.Types

Integral CULLong 
Instance details

Defined in Foreign.C.Types

Integral CULong 
Instance details

Defined in Foreign.C.Types

Integral CUShort 
Instance details

Defined in Foreign.C.Types

Integral CWchar 
Instance details

Defined in Foreign.C.Types

Integral Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Integral Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Integral Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Integral Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

quot :: Int8 -> Int8 -> Int8 #

rem :: Int8 -> Int8 -> Int8 #

div :: Int8 -> Int8 -> Int8 #

mod :: Int8 -> Int8 -> Int8 #

quotRem :: Int8 -> Int8 -> (Int8, Int8) #

divMod :: Int8 -> Int8 -> (Int8, Int8) #

toInteger :: Int8 -> Integer #

Integral Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Integral Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Integral Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Integral Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Integral CBlkCnt 
Instance details

Defined in System.Posix.Types

Integral CBlkSize 
Instance details

Defined in System.Posix.Types

Integral CClockId 
Instance details

Defined in System.Posix.Types

Integral CDev 
Instance details

Defined in System.Posix.Types

Methods

quot :: CDev -> CDev -> CDev #

rem :: CDev -> CDev -> CDev #

div :: CDev -> CDev -> CDev #

mod :: CDev -> CDev -> CDev #

quotRem :: CDev -> CDev -> (CDev, CDev) #

divMod :: CDev -> CDev -> (CDev, CDev) #

toInteger :: CDev -> Integer #

Integral CFsBlkCnt 
Instance details

Defined in System.Posix.Types

Integral CFsFilCnt 
Instance details

Defined in System.Posix.Types

Integral CGid 
Instance details

Defined in System.Posix.Types

Methods

quot :: CGid -> CGid -> CGid #

rem :: CGid -> CGid -> CGid #

div :: CGid -> CGid -> CGid #

mod :: CGid -> CGid -> CGid #

quotRem :: CGid -> CGid -> (CGid, CGid) #

divMod :: CGid -> CGid -> (CGid, CGid) #

toInteger :: CGid -> Integer #

Integral CId 
Instance details

Defined in System.Posix.Types

Methods

quot :: CId -> CId -> CId #

rem :: CId -> CId -> CId #

div :: CId -> CId -> CId #

mod :: CId -> CId -> CId #

quotRem :: CId -> CId -> (CId, CId) #

divMod :: CId -> CId -> (CId, CId) #

toInteger :: CId -> Integer #

Integral CIno 
Instance details

Defined in System.Posix.Types

Methods

quot :: CIno -> CIno -> CIno #

rem :: CIno -> CIno -> CIno #

div :: CIno -> CIno -> CIno #

mod :: CIno -> CIno -> CIno #

quotRem :: CIno -> CIno -> (CIno, CIno) #

divMod :: CIno -> CIno -> (CIno, CIno) #

toInteger :: CIno -> Integer #

Integral CKey 
Instance details

Defined in System.Posix.Types

Methods

quot :: CKey -> CKey -> CKey #

rem :: CKey -> CKey -> CKey #

div :: CKey -> CKey -> CKey #

mod :: CKey -> CKey -> CKey #

quotRem :: CKey -> CKey -> (CKey, CKey) #

divMod :: CKey -> CKey -> (CKey, CKey) #

toInteger :: CKey -> Integer #

Integral CMode 
Instance details

Defined in System.Posix.Types

Integral CNfds 
Instance details

Defined in System.Posix.Types

Integral CNlink 
Instance details

Defined in System.Posix.Types

Integral COff 
Instance details

Defined in System.Posix.Types

Methods

quot :: COff -> COff -> COff #

rem :: COff -> COff -> COff #

div :: COff -> COff -> COff #

mod :: COff -> COff -> COff #

quotRem :: COff -> COff -> (COff, COff) #

divMod :: COff -> COff -> (COff, COff) #

toInteger :: COff -> Integer #

Integral CPid 
Instance details

Defined in System.Posix.Types

Methods

quot :: CPid -> CPid -> CPid #

rem :: CPid -> CPid -> CPid #

div :: CPid -> CPid -> CPid #

mod :: CPid -> CPid -> CPid #

quotRem :: CPid -> CPid -> (CPid, CPid) #

divMod :: CPid -> CPid -> (CPid, CPid) #

toInteger :: CPid -> Integer #

Integral CRLim 
Instance details

Defined in System.Posix.Types

Integral CSocklen 
Instance details

Defined in System.Posix.Types

Integral CSsize 
Instance details

Defined in System.Posix.Types

Integral CTcflag 
Instance details

Defined in System.Posix.Types

Integral CUid 
Instance details

Defined in System.Posix.Types

Methods

quot :: CUid -> CUid -> CUid #

rem :: CUid -> CUid -> CUid #

div :: CUid -> CUid -> CUid #

mod :: CUid -> CUid -> CUid #

quotRem :: CUid -> CUid -> (CUid, CUid) #

divMod :: CUid -> CUid -> (CUid, CUid) #

toInteger :: CUid -> Integer #

Integral Fd 
Instance details

Defined in System.Posix.Types

Methods

quot :: Fd -> Fd -> Fd #

rem :: Fd -> Fd -> Fd #

div :: Fd -> Fd -> Fd #

mod :: Fd -> Fd -> Fd #

quotRem :: Fd -> Fd -> (Fd, Fd) #

divMod :: Fd -> Fd -> (Fd, Fd) #

toInteger :: Fd -> Integer #

Integral Integer

Since: base-2.0.1

Instance details

Defined in GHC.Real

Integral Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Real

Integral Int

Since: base-2.0.1

Instance details

Defined in GHC.Real

Methods

quot :: Int -> Int -> Int #

rem :: Int -> Int -> Int #

div :: Int -> Int -> Int #

mod :: Int -> Int -> Int #

quotRem :: Int -> Int -> (Int, Int) #

divMod :: Int -> Int -> (Int, Int) #

toInteger :: Int -> Integer #

Integral Word

Since: base-2.1

Instance details

Defined in GHC.Real

Methods

quot :: Word -> Word -> Word #

rem :: Word -> Word -> Word #

div :: Word -> Word -> Word #

mod :: Word -> Word -> Word #

quotRem :: Word -> Word -> (Word, Word) #

divMod :: Word -> Word -> (Word, Word) #

toInteger :: Word -> Integer #

Integral a => Integral (Blind a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

quot :: Blind a -> Blind a -> Blind a #

rem :: Blind a -> Blind a -> Blind a #

div :: Blind a -> Blind a -> Blind a #

mod :: Blind a -> Blind a -> Blind a #

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

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

toInteger :: Blind a -> Integer #

Integral a => Integral (Fixed a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

quot :: Fixed a -> Fixed a -> Fixed a #

rem :: Fixed a -> Fixed a -> Fixed a #

div :: Fixed a -> Fixed a -> Fixed a #

mod :: Fixed a -> Fixed a -> Fixed a #

quotRem :: Fixed a -> Fixed a -> (Fixed a, Fixed a) #

divMod :: Fixed a -> Fixed a -> (Fixed a, Fixed a) #

toInteger :: Fixed a -> Integer #

Integral a => Integral (Large a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

quot :: Large a -> Large a -> Large a #

rem :: Large a -> Large a -> Large a #

div :: Large a -> Large a -> Large a #

mod :: Large a -> Large a -> Large a #

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

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

toInteger :: Large a -> Integer #

Integral a => Integral (Shrink2 a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

quot :: Shrink2 a -> Shrink2 a -> Shrink2 a #

rem :: Shrink2 a -> Shrink2 a -> Shrink2 a #

div :: Shrink2 a -> Shrink2 a -> Shrink2 a #

mod :: Shrink2 a -> Shrink2 a -> Shrink2 a #

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

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

toInteger :: Shrink2 a -> Integer #

Integral a => Integral (Small a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

quot :: Small a -> Small a -> Small a #

rem :: Small a -> Small a -> Small a #

div :: Small a -> Small a -> Small a #

mod :: Small a -> Small a -> Small a #

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

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

toInteger :: Small a -> Integer #

Integral a => Integral (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Integral a => Integral (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

quot :: Const a b -> Const a b -> Const a b #

rem :: Const a b -> Const a b -> Const a b #

div :: Const a b -> Const a b -> Const a b #

mod :: Const a b -> Const a b -> Const a b #

quotRem :: Const a b -> Const a b -> (Const a b, Const a b) #

divMod :: Const a b -> Const a b -> (Const a b, Const a b) #

toInteger :: Const a b -> Integer #

Integral a => Integral (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

quot :: Tagged s a -> Tagged s a -> Tagged s a #

rem :: Tagged s a -> Tagged s a -> Tagged s a #

div :: Tagged s a -> Tagged s a -> Tagged s a #

mod :: Tagged s a -> Tagged s a -> Tagged s a #

quotRem :: Tagged s a -> Tagged s a -> (Tagged s a, Tagged s a) #

divMod :: Tagged s a -> Tagged s a -> (Tagged s a, Tagged s a) #

toInteger :: Tagged s a -> Integer #

class Applicative m => Monad (m :: Type -> Type) where #

The Monad class defines the basic operations over a monad, a concept from a branch of mathematics known as category theory. From the perspective of a Haskell programmer, however, it is best to think of a monad as an abstract datatype of actions. Haskell's do expressions provide a convenient syntax for writing monadic expressions.

Instances of Monad should satisfy the following:

Left identity
return a >>= k = k a
Right identity
m >>= return = m
Associativity
m >>= (\x -> k x >>= h) = (m >>= k) >>= h

Furthermore, the Monad and Applicative operations should relate as follows:

The above laws imply:

and that pure and (<*>) satisfy the applicative functor laws.

The instances of Monad for lists, Maybe and IO defined in the Prelude satisfy these laws.

Minimal complete definition

(>>=)

Methods

(>>=) :: m a -> (a -> m b) -> m b infixl 1 #

Sequentially compose two actions, passing any value produced by the first as an argument to the second.

'as >>= bs' can be understood as the do expression

do a <- as
   bs a

(>>) :: m a -> m b -> m b infixl 1 #

Sequentially compose two actions, discarding any value produced by the first, like sequencing operators (such as the semicolon) in imperative languages.

'as >> bs' can be understood as the do expression

do as
   bs

return :: a -> m a #

Inject a value into the monadic type.

Instances

Instances details
Monad Gen 
Instance details

Defined in Test.QuickCheck.Gen

Methods

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

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

return :: a -> Gen a #

Monad Rose 
Instance details

Defined in Test.QuickCheck.Property

Methods

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

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

return :: a -> Rose a #

Monad IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

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

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

return :: a -> IResult a #

Monad Parser 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

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

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

return :: a -> Parser a #

Monad Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

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

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

return :: a -> Result a #

Monad Complex

Since: base-4.9.0.0

Instance details

Defined in Data.Complex

Methods

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

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

return :: a -> Complex a #

Monad Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

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

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

return :: a -> Identity a #

Monad First

Since: base-4.8.0.0

Instance details

Defined in Data.Monoid

Methods

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

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

return :: a -> First a #

Monad Last

Since: base-4.8.0.0

Instance details

Defined in Data.Monoid

Methods

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

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

return :: a -> Last a #

Monad Down

Since: base-4.11.0.0

Instance details

Defined in Data.Ord

Methods

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

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

return :: a -> Down a #

Monad First

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

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

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

return :: a -> First a #

Monad Last

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

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

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

return :: a -> Last a #

Monad Max

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

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

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

return :: a -> Max a #

Monad Min

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

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

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

return :: a -> Min a #

Monad Dual

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

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

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

return :: a -> Dual a #

Monad Product

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

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

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

return :: a -> Product a #

Monad Sum

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

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

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

return :: a -> Sum a #

Monad STM

Since: base-4.3.0.0

Instance details

Defined in GHC.Conc.Sync

Methods

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

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

return :: a -> STM a #

Monad Par1

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

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

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

return :: a -> Par1 a #

Monad P

Since: base-2.1

Instance details

Defined in Text.ParserCombinators.ReadP

Methods

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

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

return :: a -> P a #

Monad ReadP

Since: base-2.1

Instance details

Defined in Text.ParserCombinators.ReadP

Methods

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

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

return :: a -> ReadP a #

Monad Put 
Instance details

Defined in Data.ByteString.Builder.Internal

Methods

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

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

return :: a -> Put a #

Monad Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

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

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

return :: a -> Seq a #

Monad Tree 
Instance details

Defined in Data.Tree

Methods

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

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

return :: a -> Tree a #

Monad CryptoFailable 
Instance details

Defined in Crypto.Error.Types

Monad DNonEmpty 
Instance details

Defined in Data.DList.DNonEmpty.Internal

Methods

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

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

return :: a -> DNonEmpty a #

Monad DList 
Instance details

Defined in Data.DList.Internal

Methods

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

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

return :: a -> DList a #

Monad IO

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

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

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

return :: a -> IO a #

Monad ParserM 
Instance details

Defined in Options.Applicative.Types

Methods

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

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

return :: a -> ParserM a #

Monad ParserResult 
Instance details

Defined in Options.Applicative.Types

Monad ReadM 
Instance details

Defined in Options.Applicative.Types

Methods

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

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

return :: a -> ReadM a #

Monad Array 
Instance details

Defined in Data.Primitive.Array

Methods

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

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

return :: a -> Array a #

Monad SmallArray 
Instance details

Defined in Data.Primitive.SmallArray

Methods

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

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

return :: a -> SmallArray a #

Monad Acquire 
Instance details

Defined in Data.Acquire.Internal

Methods

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

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

return :: a -> Acquire a #

Monad Q 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

return :: a -> Q a #

Monad Memoized 
Instance details

Defined in UnliftIO.Memoize

Methods

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

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

return :: a -> Memoized a #

Monad Vector 
Instance details

Defined in Data.Vector

Methods

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

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

return :: a -> Vector a #

Monad Id 
Instance details

Defined in Data.Vector.Fusion.Util

Methods

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

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

return :: a -> Id a #

Monad Stream 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

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

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

return :: a -> Stream a #

Monad NonEmpty

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

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

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

return :: a -> NonEmpty a #

Monad Maybe

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

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

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

return :: a -> Maybe a #

Monad Solo

Since: base-4.15

Instance details

Defined in GHC.Base

Methods

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

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

return :: a -> Solo a #

Monad []

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

(>>=) :: [a] -> (a -> [b]) -> [b] #

(>>) :: [a] -> [b] -> [b] #

return :: a -> [a] #

Representable f => Monad (Co f) 
Instance details

Defined in Data.Functor.Rep

Methods

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

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

return :: a -> Co f a #

Monad (Parser i) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

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

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

return :: a -> Parser i a #

Monad m => Monad (WrappedMonad m)

Since: base-4.7.0.0

Instance details

Defined in Control.Applicative

Methods

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

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

return :: a -> WrappedMonad m a #

ArrowApply a => Monad (ArrowMonad a)

Since: base-2.1

Instance details

Defined in Control.Arrow

Methods

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

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

return :: a0 -> ArrowMonad a a0 #

Monad (Either e)

Since: base-4.4.0.0

Instance details

Defined in Data.Either

Methods

(>>=) :: Either e a -> (a -> Either e b) -> Either e b #

(>>) :: Either e a -> Either e b -> Either e b #

return :: a -> Either e a #

Monad (Proxy :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

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

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

return :: a -> Proxy a #

Monad (U1 :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

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

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

return :: a -> U1 a #

Monad (ST s)

Since: base-2.1

Instance details

Defined in GHC.ST

Methods

(>>=) :: ST s a -> (a -> ST s b) -> ST s b #

(>>) :: ST s a -> ST s b -> ST s b #

return :: a -> ST s a #

Monad (SetM s) 
Instance details

Defined in Data.Graph

Methods

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

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

return :: a -> SetM s a #

Alternative f => Monad (Cofree f) 
Instance details

Defined in Control.Comonad.Cofree

Methods

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

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

return :: a -> Cofree f a #

Functor f => Monad (Free f) 
Instance details

Defined in Control.Monad.Free

Methods

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

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

return :: a -> Free f a #

Monad m => Monad (Yoneda m) 
Instance details

Defined in Data.Functor.Yoneda

Methods

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

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

return :: a -> Yoneda m a #

Monad (ReifiedFold s) 
Instance details

Defined in Control.Lens.Reified

Methods

(>>=) :: ReifiedFold s a -> (a -> ReifiedFold s b) -> ReifiedFold s b #

(>>) :: ReifiedFold s a -> ReifiedFold s b -> ReifiedFold s b #

return :: a -> ReifiedFold s a #

Monad (ReifiedGetter s) 
Instance details

Defined in Control.Lens.Reified

Methods

(>>=) :: ReifiedGetter s a -> (a -> ReifiedGetter s b) -> ReifiedGetter s b #

(>>) :: ReifiedGetter s a -> ReifiedGetter s b -> ReifiedGetter s b #

return :: a -> ReifiedGetter s a #

Monad m => Monad (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

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

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

return :: a -> LoggingT m a #

Monad m => Monad (NoLoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

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

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

return :: a -> NoLoggingT m a #

Monad m => Monad (WriterLoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

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

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

return :: a -> WriterLoggingT m a #

Monad f => Monad (WrappedPoly f) 
Instance details

Defined in Data.MonoTraversable

Methods

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

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

return :: a -> WrappedPoly f a #

Monad m => Monad (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

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

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

return :: a -> ResourceT m a #

Monad (RIO env) 
Instance details

Defined in RIO.Prelude.RIO

Methods

(>>=) :: RIO env a -> (a -> RIO env b) -> RIO env b #

(>>) :: RIO env a -> RIO env b -> RIO env b #

return :: a -> RIO env a #

Semigroup a => Monad (These a) 
Instance details

Defined in Data.Strict.These

Methods

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

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

return :: a0 -> These a a0 #

Semigroup a => Monad (These a) 
Instance details

Defined in Data.These

Methods

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

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

return :: a0 -> These a a0 #

Monad m => Monad (ListT m) 
Instance details

Defined in Control.Monad.Trans.List

Methods

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

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

return :: a -> ListT m a #

Monad m => Monad (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

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

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

return :: a -> MaybeT m a #

Monoid a => Monad ((,) a)

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

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

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

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

Monad m => Monad (Kleisli m a)

Since: base-4.14.0.0

Instance details

Defined in Control.Arrow

Methods

(>>=) :: Kleisli m a a0 -> (a0 -> Kleisli m a b) -> Kleisli m a b #

(>>) :: Kleisli m a a0 -> Kleisli m a b -> Kleisli m a b #

return :: a0 -> Kleisli m a a0 #

Monad f => Monad (Ap f)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

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

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

return :: a -> Ap f a #

Monad f => Monad (Alt f)

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

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

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

return :: a -> Alt f a #

Monad f => Monad (Rec1 f)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

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

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

return :: a -> Rec1 f a #

(Applicative f, Monad f) => Monad (WhenMissing f x)

Equivalent to ReaderT k (ReaderT x (MaybeT f)).

Since: containers-0.5.9

Instance details

Defined in Data.IntMap.Internal

Methods

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

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

return :: a -> WhenMissing f x a #

(Alternative f, Monad w) => Monad (CofreeT f w) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

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

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

return :: a -> CofreeT f w a #

(Functor f, Monad m) => Monad (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

(>>=) :: FreeT f m a -> (a -> FreeT f m b) -> FreeT f m b #

(>>) :: FreeT f m a -> FreeT f m b -> FreeT f m b #

return :: a -> FreeT f m a #

Monad (Indexed i a) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

(>>=) :: Indexed i a a0 -> (a0 -> Indexed i a b) -> Indexed i a b #

(>>) :: Indexed i a a0 -> Indexed i a b -> Indexed i a b #

return :: a0 -> Indexed i a a0 #

Monad m => Monad (StateT s m) 
Instance details

Defined in Lens.Micro

Methods

(>>=) :: StateT s m a -> (a -> StateT s m b) -> StateT s m b #

(>>) :: StateT s m a -> StateT s m b -> StateT s m b #

return :: a -> StateT s m a #

(Monad (Rep p), Representable p) => Monad (Prep p) 
Instance details

Defined in Data.Profunctor.Rep

Methods

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

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

return :: a -> Prep p a #

Monad m => Monad (AppT app m) Source # 
Instance details

Defined in Stackctl.CLI

Methods

(>>=) :: AppT app m a -> (a -> AppT app m b) -> AppT app m b #

(>>) :: AppT app m a -> AppT app m b -> AppT app m b #

return :: a -> AppT app m a #

Monad (Tagged s) 
Instance details

Defined in Data.Tagged

Methods

(>>=) :: Tagged s a -> (a -> Tagged s b) -> Tagged s b #

(>>) :: Tagged s a -> Tagged s b -> Tagged s b #

return :: a -> Tagged s a #

(Monoid w, Functor m, Monad m) => Monad (AccumT w m) 
Instance details

Defined in Control.Monad.Trans.Accum

Methods

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

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

return :: a -> AccumT w m a #

(Monad m, Error e) => Monad (ErrorT e m) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

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

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

return :: a -> ErrorT e m a #

Monad m => Monad (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

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

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

return :: a -> ExceptT e m a #

Monad m => Monad (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

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

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

return :: a -> IdentityT m a #

Monad m => Monad (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

(>>=) :: ReaderT r m a -> (a -> ReaderT r m b) -> ReaderT r m b #

(>>) :: ReaderT r m a -> ReaderT r m b -> ReaderT r m b #

return :: a -> ReaderT r m a #

Monad m => Monad (SelectT r m) 
Instance details

Defined in Control.Monad.Trans.Select

Methods

(>>=) :: SelectT r m a -> (a -> SelectT r m b) -> SelectT r m b #

(>>) :: SelectT r m a -> SelectT r m b -> SelectT r m b #

return :: a -> SelectT r m a #

Monad m => Monad (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Lazy

Methods

(>>=) :: StateT s m a -> (a -> StateT s m b) -> StateT s m b #

(>>) :: StateT s m a -> StateT s m b -> StateT s m b #

return :: a -> StateT s m a #

Monad m => Monad (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

(>>=) :: StateT s m a -> (a -> StateT s m b) -> StateT s m b #

(>>) :: StateT s m a -> StateT s m b -> StateT s m b #

return :: a -> StateT s m a #

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

Defined in Control.Monad.Trans.Writer.Lazy

Methods

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

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

return :: a -> WriterT w m a #

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

Defined in Control.Monad.Trans.Writer.Strict

Methods

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

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

return :: a -> WriterT w m a #

Monad m => Monad (Reverse m)

Derived instance.

Instance details

Defined in Data.Functor.Reverse

Methods

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

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

return :: a -> Reverse m a #

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

Since: base-4.14.0.0

Instance details

Defined in GHC.Base

Methods

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

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

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

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

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Product

Methods

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

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

return :: a -> Product f g a #

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

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

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

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

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

Monad (ConduitT i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

(>>=) :: ConduitT i o m a -> (a -> ConduitT i o m b) -> ConduitT i o m b #

(>>) :: ConduitT i o m a -> ConduitT i o m b -> ConduitT i o m b #

return :: a -> ConduitT i o m a #

(Monad f, Applicative f) => Monad (WhenMatched f x y)

Equivalent to ReaderT Key (ReaderT x (ReaderT y (MaybeT f)))

Since: containers-0.5.9

Instance details

Defined in Data.IntMap.Internal

Methods

(>>=) :: WhenMatched f x y a -> (a -> WhenMatched f x y b) -> WhenMatched f x y b #

(>>) :: WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y b #

return :: a -> WhenMatched f x y a #

(Applicative f, Monad f) => Monad (WhenMissing f k x)

Equivalent to ReaderT k (ReaderT x (MaybeT f)) .

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

(>>=) :: WhenMissing f k x a -> (a -> WhenMissing f k x b) -> WhenMissing f k x b #

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

return :: a -> WhenMissing f k x a #

Monad (ContT r m) 
Instance details

Defined in Control.Monad.Trans.Cont

Methods

(>>=) :: ContT r m a -> (a -> ContT r m b) -> ContT r m b #

(>>) :: ContT r m a -> ContT r m b -> ContT r m b #

return :: a -> ContT r m a #

(Monoid a, Monoid b, Monoid c) => Monad ((,,,) a b c)

Since: base-4.14.0.0

Instance details

Defined in GHC.Base

Methods

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

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

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

Monad ((->) r)

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

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

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

return :: a -> r -> a #

Monad f => Monad (M1 i c f)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

(>>=) :: M1 i c f a -> (a -> M1 i c f b) -> M1 i c f b #

(>>) :: M1 i c f a -> M1 i c f b -> M1 i c f b #

return :: a -> M1 i c f a #

(Monad f, Applicative f) => Monad (WhenMatched f k x y)

Equivalent to ReaderT k (ReaderT x (ReaderT y (MaybeT f)))

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

(>>=) :: WhenMatched f k x y a -> (a -> WhenMatched f k x y b) -> WhenMatched f k x y b #

(>>) :: WhenMatched f k x y a -> WhenMatched f k x y b -> WhenMatched f k x y b #

return :: a -> WhenMatched f k x y a #

(Monoid w, Monad m) => Monad (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.Lazy

Methods

(>>=) :: RWST r w s m a -> (a -> RWST r w s m b) -> RWST r w s m b #

(>>) :: RWST r w s m a -> RWST r w s m b -> RWST r w s m b #

return :: a -> RWST r w s m a #

(Monoid w, Monad m) => Monad (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.Strict

Methods

(>>=) :: RWST r w s m a -> (a -> RWST r w s m b) -> RWST r w s m b #

(>>) :: RWST r w s m a -> RWST r w s m b -> RWST r w s m b #

return :: a -> RWST r w s m a #

Monad state => Monad (Builder collection mutCollection step state err) 
Instance details

Defined in Basement.MutableBuilder

Methods

(>>=) :: Builder collection mutCollection step state err a -> (a -> Builder collection mutCollection step state err b) -> Builder collection mutCollection step state err b #

(>>) :: Builder collection mutCollection step state err a -> Builder collection mutCollection step state err b -> Builder collection mutCollection step state err b #

return :: a -> Builder collection mutCollection step state err a #

Monad m => Monad (Pipe l i o u m) 
Instance details

Defined in Data.Conduit.Internal.Pipe

Methods

(>>=) :: Pipe l i o u m a -> (a -> Pipe l i o u m b) -> Pipe l i o u m b #

(>>) :: Pipe l i o u m a -> Pipe l i o u m b -> Pipe l i o u m b #

return :: a -> Pipe l i o u m a #

class Typeable a => Data a where #

The Data class comprehends a fundamental primitive gfoldl for folding over constructor applications, say terms. This primitive can be instantiated in several ways to map over the immediate subterms of a term; see the gmap combinators later in this class. Indeed, a generic programmer does not necessarily need to use the ingenious gfoldl primitive but rather the intuitive gmap combinators. The gfoldl primitive is completed by means to query top-level constructors, to turn constructor representations into proper terms, and to list all possible datatype constructors. This completion allows us to serve generic programming scenarios like read, show, equality, term generation.

The combinators gmapT, gmapQ, gmapM, etc are all provided with default definitions in terms of gfoldl, leaving open the opportunity to provide datatype-specific definitions. (The inclusion of the gmap combinators as members of class Data allows the programmer or the compiler to derive specialised, and maybe more efficient code per datatype. Note: gfoldl is more higher-order than the gmap combinators. This is subject to ongoing benchmarking experiments. It might turn out that the gmap combinators will be moved out of the class Data.)

Conceptually, the definition of the gmap combinators in terms of the primitive gfoldl requires the identification of the gfoldl function arguments. Technically, we also need to identify the type constructor c for the construction of the result type from the folded term type.

In the definition of gmapQx combinators, we use phantom type constructors for the c in the type of gfoldl because the result type of a query does not involve the (polymorphic) type of the term argument. In the definition of gmapQl we simply use the plain constant type constructor because gfoldl is left-associative anyway and so it is readily suited to fold a left-associative binary operation over the immediate subterms. In the definition of gmapQr, extra effort is needed. We use a higher-order accumulation trick to mediate between left-associative constructor application vs. right-associative binary operation (e.g., (:)). When the query is meant to compute a value of type r, then the result type within generic folding is r -> r. So the result of folding is a function to which we finally pass the right unit.

With the -XDeriveDataTypeable option, GHC can generate instances of the Data class automatically. For example, given the declaration

data T a b = C1 a b | C2 deriving (Typeable, Data)

GHC will generate an instance that is equivalent to

instance (Data a, Data b) => Data (T a b) where
    gfoldl k z (C1 a b) = z C1 `k` a `k` b
    gfoldl k z C2       = z C2

    gunfold k z c = case constrIndex c of
                        1 -> k (k (z C1))
                        2 -> z C2

    toConstr (C1 _ _) = con_C1
    toConstr C2       = con_C2

    dataTypeOf _ = ty_T

con_C1 = mkConstr ty_T "C1" [] Prefix
con_C2 = mkConstr ty_T "C2" [] Prefix
ty_T   = mkDataType "Module.T" [con_C1, con_C2]

This is suitable for datatypes that are exported transparently.

Minimal complete definition

gunfold, toConstr, dataTypeOf

Methods

gfoldl #

Arguments

:: (forall d b. Data d => c (d -> b) -> d -> c b)

defines how nonempty constructor applications are folded. It takes the folded tail of the constructor application and its head, i.e., an immediate subterm, and combines them in some way.

-> (forall g. g -> c g)

defines how the empty constructor application is folded, like the neutral / start element for list folding.

-> a

structure to be folded.

-> c a

result, with a type defined in terms of a, but variability is achieved by means of type constructor c for the construction of the actual result type.

Left-associative fold operation for constructor applications.

The type of gfoldl is a headache, but operationally it is a simple generalisation of a list fold.

The default definition for gfoldl is const id, which is suitable for abstract datatypes with no substructures.

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

Unfolding constructor applications

toConstr :: a -> Constr #

Obtaining the constructor from a given datum. For proper terms, this is meant to be the top-level constructor. Primitive datatypes are here viewed as potentially infinite sets of values (i.e., constructors).

dataTypeOf :: a -> DataType #

The outer type constructor of the type

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

Mediate types and unary type constructors.

In Data instances of the form

    instance (Data a, ...) => Data (T a)

dataCast1 should be defined as gcast1.

The default definition is const Nothing, which is appropriate for instances of other forms.

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

Mediate types and binary type constructors.

In Data instances of the form

    instance (Data a, Data b, ...) => Data (T a b)

dataCast2 should be defined as gcast2.

The default definition is const Nothing, which is appropriate for instances of other forms.

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

A generic transformation that maps over the immediate subterms

The default definition instantiates the type constructor c in the type of gfoldl to an identity datatype constructor, using the isomorphism pair as injection and projection.

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

A generic query with a left-associative binary operator

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

A generic query with a right-associative binary operator

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

A generic query that processes the immediate subterms and returns a list of results. The list is given in the same order as originally specified in the declaration of the data constructors.

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

A generic query that processes one child by index (zero-based)

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

A generic monadic transformation that maps over the immediate subterms

The default definition instantiates the type constructor c in the type of gfoldl to the monad datatype constructor, defining injection and projection using return and >>=.

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

Transformation of at least one immediate subterm does not fail

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

Transformation of one immediate subterm with success

Instances

Instances details
Data Key 
Instance details

Defined in Data.Aeson.Key

Methods

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

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

toConstr :: Key -> Constr #

dataTypeOf :: Key -> DataType #

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

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

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

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

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

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

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

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

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

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

Data Value 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

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

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

toConstr :: Value -> Constr #

dataTypeOf :: Value -> DataType #

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

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

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

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

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

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

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

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

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

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

Data All

Since: base-4.8.0.0

Instance details

Defined in Data.Data

Methods

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

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

toConstr :: All -> Constr #

dataTypeOf :: All -> DataType #

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

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

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

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

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

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

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

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

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

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

Data Any

Since: base-4.8.0.0

Instance details

Defined in Data.Data

Methods

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

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

toConstr :: Any -> Constr #

dataTypeOf :: Any -> DataType #

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

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

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

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

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

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

gmapQi :: Int -> (forall d. Data d => d -> u) -> Any -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Any -> m Any #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Any -> m Any #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Any -> m Any #

Data Version

Since: base-4.7.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Version -> c Version #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Version #

toConstr :: Version -> Constr #

dataTypeOf :: Version -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Version) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Version) #

gmapT :: (forall b. Data b => b -> b) -> Version -> Version #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Version -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Version -> r #

gmapQ :: (forall d. Data d => d -> u) -> Version -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Version -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Version -> m Version #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Version -> m Version #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Version -> m Version #

Data Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Void -> c Void #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Void #

toConstr :: Void -> Constr #

dataTypeOf :: Void -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Void) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Void) #

gmapT :: (forall b. Data b => b -> b) -> Void -> Void #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Void -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Void -> r #

gmapQ :: (forall d. Data d => d -> u) -> Void -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Void -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Void -> m Void #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Void -> m Void #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Void -> m Void #

Data IntPtr

Since: base-4.11.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IntPtr -> c IntPtr #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IntPtr #

toConstr :: IntPtr -> Constr #

dataTypeOf :: IntPtr -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IntPtr) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IntPtr) #

gmapT :: (forall b. Data b => b -> b) -> IntPtr -> IntPtr #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IntPtr -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IntPtr -> r #

gmapQ :: (forall d. Data d => d -> u) -> IntPtr -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IntPtr -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IntPtr -> m IntPtr #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IntPtr -> m IntPtr #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IntPtr -> m IntPtr #

Data WordPtr

Since: base-4.11.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> WordPtr -> c WordPtr #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c WordPtr #

toConstr :: WordPtr -> Constr #

dataTypeOf :: WordPtr -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c WordPtr) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c WordPtr) #

gmapT :: (forall b. Data b => b -> b) -> WordPtr -> WordPtr #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WordPtr -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WordPtr -> r #

gmapQ :: (forall d. Data d => d -> u) -> WordPtr -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> WordPtr -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> WordPtr -> m WordPtr #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> WordPtr -> m WordPtr #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> WordPtr -> m WordPtr #

Data SpecConstrAnnotation

Since: base-4.3.0.0

Instance details

Defined in GHC.Exts

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SpecConstrAnnotation -> c SpecConstrAnnotation #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SpecConstrAnnotation #

toConstr :: SpecConstrAnnotation -> Constr #

dataTypeOf :: SpecConstrAnnotation -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SpecConstrAnnotation) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SpecConstrAnnotation) #

gmapT :: (forall b. Data b => b -> b) -> SpecConstrAnnotation -> SpecConstrAnnotation #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SpecConstrAnnotation -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SpecConstrAnnotation -> r #

gmapQ :: (forall d. Data d => d -> u) -> SpecConstrAnnotation -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SpecConstrAnnotation -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SpecConstrAnnotation -> m SpecConstrAnnotation #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SpecConstrAnnotation -> m SpecConstrAnnotation #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SpecConstrAnnotation -> m SpecConstrAnnotation #

Data Associativity

Since: base-4.9.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Associativity -> c Associativity #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Associativity #

toConstr :: Associativity -> Constr #

dataTypeOf :: Associativity -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Associativity) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Associativity) #

gmapT :: (forall b. Data b => b -> b) -> Associativity -> Associativity #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Associativity -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Associativity -> r #

gmapQ :: (forall d. Data d => d -> u) -> Associativity -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Associativity -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Associativity -> m Associativity #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Associativity -> m Associativity #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Associativity -> m Associativity #

Data DecidedStrictness

Since: base-4.9.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DecidedStrictness -> c DecidedStrictness #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DecidedStrictness #

toConstr :: DecidedStrictness -> Constr #

dataTypeOf :: DecidedStrictness -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DecidedStrictness) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DecidedStrictness) #

gmapT :: (forall b. Data b => b -> b) -> DecidedStrictness -> DecidedStrictness #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DecidedStrictness -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DecidedStrictness -> r #

gmapQ :: (forall d. Data d => d -> u) -> DecidedStrictness -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DecidedStrictness -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DecidedStrictness -> m DecidedStrictness #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DecidedStrictness -> m DecidedStrictness #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DecidedStrictness -> m DecidedStrictness #

Data Fixity

Since: base-4.9.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Fixity -> c Fixity #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Fixity #

toConstr :: Fixity -> Constr #

dataTypeOf :: Fixity -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Fixity) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Fixity) #

gmapT :: (forall b. Data b => b -> b) -> Fixity -> Fixity #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Fixity -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Fixity -> r #

gmapQ :: (forall d. Data d => d -> u) -> Fixity -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Fixity -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Fixity -> m Fixity #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Fixity -> m Fixity #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Fixity -> m Fixity #

Data SourceStrictness

Since: base-4.9.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SourceStrictness -> c SourceStrictness #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SourceStrictness #

toConstr :: SourceStrictness -> Constr #

dataTypeOf :: SourceStrictness -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SourceStrictness) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SourceStrictness) #

gmapT :: (forall b. Data b => b -> b) -> SourceStrictness -> SourceStrictness #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SourceStrictness -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SourceStrictness -> r #

gmapQ :: (forall d. Data d => d -> u) -> SourceStrictness -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SourceStrictness -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SourceStrictness -> m SourceStrictness #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SourceStrictness -> m SourceStrictness #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SourceStrictness -> m SourceStrictness #

Data SourceUnpackedness

Since: base-4.9.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SourceUnpackedness -> c SourceUnpackedness #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SourceUnpackedness #

toConstr :: SourceUnpackedness -> Constr #

dataTypeOf :: SourceUnpackedness -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SourceUnpackedness) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SourceUnpackedness) #

gmapT :: (forall b. Data b => b -> b) -> SourceUnpackedness -> SourceUnpackedness #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SourceUnpackedness -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SourceUnpackedness -> r #

gmapQ :: (forall d. Data d => d -> u) -> SourceUnpackedness -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SourceUnpackedness -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SourceUnpackedness -> m SourceUnpackedness #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SourceUnpackedness -> m SourceUnpackedness #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SourceUnpackedness -> m SourceUnpackedness #

Data Int16

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Int16 -> c Int16 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Int16 #

toConstr :: Int16 -> Constr #

dataTypeOf :: Int16 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Int16) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Int16) #

gmapT :: (forall b. Data b => b -> b) -> Int16 -> Int16 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Int16 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Int16 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Int16 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Int16 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Int16 -> m Int16 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Int16 -> m Int16 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Int16 -> m Int16 #

Data Int32

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Int32 -> c Int32 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Int32 #

toConstr :: Int32 -> Constr #

dataTypeOf :: Int32 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Int32) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Int32) #

gmapT :: (forall b. Data b => b -> b) -> Int32 -> Int32 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Int32 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Int32 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Int32 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Int32 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Int32 -> m Int32 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Int32 -> m Int32 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Int32 -> m Int32 #

Data Int64

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Int64 -> c Int64 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Int64 #

toConstr :: Int64 -> Constr #

dataTypeOf :: Int64 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Int64) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Int64) #

gmapT :: (forall b. Data b => b -> b) -> Int64 -> Int64 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Int64 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Int64 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Int64 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Int64 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Int64 -> m Int64 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Int64 -> m Int64 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Int64 -> m Int64 #

Data Int8

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Int8 -> c Int8 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Int8 #

toConstr :: Int8 -> Constr #

dataTypeOf :: Int8 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Int8) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Int8) #

gmapT :: (forall b. Data b => b -> b) -> Int8 -> Int8 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Int8 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Int8 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Int8 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Int8 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Int8 -> m Int8 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Int8 -> m Int8 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Int8 -> m Int8 #

Data Word16

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Word16 -> c Word16 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Word16 #

toConstr :: Word16 -> Constr #

dataTypeOf :: Word16 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Word16) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Word16) #

gmapT :: (forall b. Data b => b -> b) -> Word16 -> Word16 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Word16 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Word16 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Word16 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Word16 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Word16 -> m Word16 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Word16 -> m Word16 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Word16 -> m Word16 #

Data Word32

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Word32 -> c Word32 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Word32 #

toConstr :: Word32 -> Constr #

dataTypeOf :: Word32 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Word32) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Word32) #

gmapT :: (forall b. Data b => b -> b) -> Word32 -> Word32 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Word32 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Word32 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Word32 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Word32 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Word32 -> m Word32 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Word32 -> m Word32 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Word32 -> m Word32 #

Data Word64

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Word64 -> c Word64 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Word64 #

toConstr :: Word64 -> Constr #

dataTypeOf :: Word64 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Word64) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Word64) #

gmapT :: (forall b. Data b => b -> b) -> Word64 -> Word64 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Word64 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Word64 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Word64 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Word64 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Word64 -> m Word64 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Word64 -> m Word64 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Word64 -> m Word64 #

Data Word8

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Word8 -> c Word8 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Word8 #

toConstr :: Word8 -> Constr #

dataTypeOf :: Word8 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Word8) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Word8) #

gmapT :: (forall b. Data b => b -> b) -> Word8 -> Word8 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Word8 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Word8 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Word8 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Word8 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Word8 -> m Word8 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Word8 -> m Word8 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Word8 -> m Word8 #

Data Encoding 
Instance details

Defined in Basement.String

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Encoding -> c Encoding #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Encoding #

toConstr :: Encoding -> Constr #

dataTypeOf :: Encoding -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Encoding) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Encoding) #

gmapT :: (forall b. Data b => b -> b) -> Encoding -> Encoding #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Encoding -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Encoding -> r #

gmapQ :: (forall d. Data d => d -> u) -> Encoding -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Encoding -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Encoding -> m Encoding #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Encoding -> m Encoding #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Encoding -> m Encoding #

Data String 
Instance details

Defined in Basement.UTF8.Base

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> String -> c String #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c String #

toConstr :: String -> Constr #

dataTypeOf :: String -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c String) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c String) #

gmapT :: (forall b. Data b => b -> b) -> String -> String #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> String -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> String -> r #

gmapQ :: (forall d. Data d => d -> u) -> String -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> String -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> String -> m String #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> String -> m String #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> String -> m String #

Data ByteString 
Instance details

Defined in Data.ByteString.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ByteString -> c ByteString #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ByteString #

toConstr :: ByteString -> Constr #

dataTypeOf :: ByteString -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ByteString) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ByteString) #

gmapT :: (forall b. Data b => b -> b) -> ByteString -> ByteString #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ByteString -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ByteString -> r #

gmapQ :: (forall d. Data d => d -> u) -> ByteString -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ByteString -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ByteString -> m ByteString #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ByteString -> m ByteString #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ByteString -> m ByteString #

Data ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ByteString -> c ByteString #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ByteString #

toConstr :: ByteString -> Constr #

dataTypeOf :: ByteString -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ByteString) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ByteString) #

gmapT :: (forall b. Data b => b -> b) -> ByteString -> ByteString #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ByteString -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ByteString -> r #

gmapQ :: (forall d. Data d => d -> u) -> ByteString -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ByteString -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ByteString -> m ByteString #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ByteString -> m ByteString #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ByteString -> m ByteString #

Data ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ShortByteString -> c ShortByteString #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ShortByteString #

toConstr :: ShortByteString -> Constr #

dataTypeOf :: ShortByteString -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ShortByteString) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ShortByteString) #

gmapT :: (forall b. Data b => b -> b) -> ShortByteString -> ShortByteString #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ShortByteString -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ShortByteString -> r #

gmapQ :: (forall d. Data d => d -> u) -> ShortByteString -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ShortByteString -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ShortByteString -> m ShortByteString #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ShortByteString -> m ShortByteString #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ShortByteString -> m ShortByteString #

Data IntSet 
Instance details

Defined in Data.IntSet.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IntSet -> c IntSet #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IntSet #

toConstr :: IntSet -> Constr #

dataTypeOf :: IntSet -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IntSet) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IntSet) #

gmapT :: (forall b. Data b => b -> b) -> IntSet -> IntSet #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IntSet -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IntSet -> r #

gmapQ :: (forall d. Data d => d -> u) -> IntSet -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IntSet -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IntSet -> m IntSet #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IntSet -> m IntSet #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IntSet -> m IntSet #

Data Curve_Edwards25519 
Instance details

Defined in Crypto.ECC

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Curve_Edwards25519 -> c Curve_Edwards25519 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Curve_Edwards25519 #

toConstr :: Curve_Edwards25519 -> Constr #

dataTypeOf :: Curve_Edwards25519 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Curve_Edwards25519) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Curve_Edwards25519) #

gmapT :: (forall b. Data b => b -> b) -> Curve_Edwards25519 -> Curve_Edwards25519 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Curve_Edwards25519 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Curve_Edwards25519 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Curve_Edwards25519 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Curve_Edwards25519 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Curve_Edwards25519 -> m Curve_Edwards25519 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Curve_Edwards25519 -> m Curve_Edwards25519 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Curve_Edwards25519 -> m Curve_Edwards25519 #

Data Curve_P256R1 
Instance details

Defined in Crypto.ECC

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Curve_P256R1 -> c Curve_P256R1 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Curve_P256R1 #

toConstr :: Curve_P256R1 -> Constr #

dataTypeOf :: Curve_P256R1 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Curve_P256R1) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Curve_P256R1) #

gmapT :: (forall b. Data b => b -> b) -> Curve_P256R1 -> Curve_P256R1 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Curve_P256R1 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Curve_P256R1 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Curve_P256R1 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Curve_P256R1 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Curve_P256R1 -> m Curve_P256R1 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Curve_P256R1 -> m Curve_P256R1 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Curve_P256R1 -> m Curve_P256R1 #

Data Curve_P384R1 
Instance details

Defined in Crypto.ECC

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Curve_P384R1 -> c Curve_P384R1 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Curve_P384R1 #

toConstr :: Curve_P384R1 -> Constr #

dataTypeOf :: Curve_P384R1 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Curve_P384R1) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Curve_P384R1) #

gmapT :: (forall b. Data b => b -> b) -> Curve_P384R1 -> Curve_P384R1 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Curve_P384R1 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Curve_P384R1 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Curve_P384R1 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Curve_P384R1 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Curve_P384R1 -> m Curve_P384R1 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Curve_P384R1 -> m Curve_P384R1 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Curve_P384R1 -> m Curve_P384R1 #

Data Curve_P521R1 
Instance details

Defined in Crypto.ECC

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Curve_P521R1 -> c Curve_P521R1 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Curve_P521R1 #

toConstr :: Curve_P521R1 -> Constr #

dataTypeOf :: Curve_P521R1 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Curve_P521R1) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Curve_P521R1) #

gmapT :: (forall b. Data b => b -> b) -> Curve_P521R1 -> Curve_P521R1 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Curve_P521R1 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Curve_P521R1 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Curve_P521R1 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Curve_P521R1 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Curve_P521R1 -> m Curve_P521R1 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Curve_P521R1 -> m Curve_P521R1 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Curve_P521R1 -> m Curve_P521R1 #

Data Curve_X25519 
Instance details

Defined in Crypto.ECC

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Curve_X25519 -> c Curve_X25519 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Curve_X25519 #

toConstr :: Curve_X25519 -> Constr #

dataTypeOf :: Curve_X25519 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Curve_X25519) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Curve_X25519) #

gmapT :: (forall b. Data b => b -> b) -> Curve_X25519 -> Curve_X25519 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Curve_X25519 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Curve_X25519 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Curve_X25519 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Curve_X25519 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Curve_X25519 -> m Curve_X25519 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Curve_X25519 -> m Curve_X25519 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Curve_X25519 -> m Curve_X25519 #

Data Curve_X448 
Instance details

Defined in Crypto.ECC

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Curve_X448 -> c Curve_X448 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Curve_X448 #

toConstr :: Curve_X448 -> Constr #

dataTypeOf :: Curve_X448 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Curve_X448) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Curve_X448) #

gmapT :: (forall b. Data b => b -> b) -> Curve_X448 -> Curve_X448 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Curve_X448 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Curve_X448 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Curve_X448 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Curve_X448 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Curve_X448 -> m Curve_X448 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Curve_X448 -> m Curve_X448 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Curve_X448 -> m Curve_X448 #

Data CryptoError 
Instance details

Defined in Crypto.Error.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CryptoError -> c CryptoError #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CryptoError #

toConstr :: CryptoError -> Constr #

dataTypeOf :: CryptoError -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CryptoError) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CryptoError) #

gmapT :: (forall b. Data b => b -> b) -> CryptoError -> CryptoError #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CryptoError -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CryptoError -> r #

gmapQ :: (forall d. Data d => d -> u) -> CryptoError -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CryptoError -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CryptoError -> m CryptoError #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CryptoError -> m CryptoError #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CryptoError -> m CryptoError #

Data Blake2b_160 
Instance details

Defined in Crypto.Hash.Blake2b

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Blake2b_160 -> c Blake2b_160 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Blake2b_160 #

toConstr :: Blake2b_160 -> Constr #

dataTypeOf :: Blake2b_160 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Blake2b_160) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Blake2b_160) #

gmapT :: (forall b. Data b => b -> b) -> Blake2b_160 -> Blake2b_160 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Blake2b_160 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Blake2b_160 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Blake2b_160 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Blake2b_160 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Blake2b_160 -> m Blake2b_160 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2b_160 -> m Blake2b_160 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2b_160 -> m Blake2b_160 #

Data Blake2b_224 
Instance details

Defined in Crypto.Hash.Blake2b

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Blake2b_224 -> c Blake2b_224 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Blake2b_224 #

toConstr :: Blake2b_224 -> Constr #

dataTypeOf :: Blake2b_224 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Blake2b_224) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Blake2b_224) #

gmapT :: (forall b. Data b => b -> b) -> Blake2b_224 -> Blake2b_224 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Blake2b_224 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Blake2b_224 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Blake2b_224 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Blake2b_224 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Blake2b_224 -> m Blake2b_224 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2b_224 -> m Blake2b_224 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2b_224 -> m Blake2b_224 #

Data Blake2b_256 
Instance details

Defined in Crypto.Hash.Blake2b

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Blake2b_256 -> c Blake2b_256 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Blake2b_256 #

toConstr :: Blake2b_256 -> Constr #

dataTypeOf :: Blake2b_256 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Blake2b_256) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Blake2b_256) #

gmapT :: (forall b. Data b => b -> b) -> Blake2b_256 -> Blake2b_256 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Blake2b_256 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Blake2b_256 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Blake2b_256 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Blake2b_256 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Blake2b_256 -> m Blake2b_256 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2b_256 -> m Blake2b_256 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2b_256 -> m Blake2b_256 #

Data Blake2b_384 
Instance details

Defined in Crypto.Hash.Blake2b

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Blake2b_384 -> c Blake2b_384 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Blake2b_384 #

toConstr :: Blake2b_384 -> Constr #

dataTypeOf :: Blake2b_384 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Blake2b_384) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Blake2b_384) #

gmapT :: (forall b. Data b => b -> b) -> Blake2b_384 -> Blake2b_384 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Blake2b_384 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Blake2b_384 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Blake2b_384 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Blake2b_384 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Blake2b_384 -> m Blake2b_384 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2b_384 -> m Blake2b_384 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2b_384 -> m Blake2b_384 #

Data Blake2b_512 
Instance details

Defined in Crypto.Hash.Blake2b

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Blake2b_512 -> c Blake2b_512 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Blake2b_512 #

toConstr :: Blake2b_512 -> Constr #

dataTypeOf :: Blake2b_512 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Blake2b_512) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Blake2b_512) #

gmapT :: (forall b. Data b => b -> b) -> Blake2b_512 -> Blake2b_512 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Blake2b_512 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Blake2b_512 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Blake2b_512 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Blake2b_512 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Blake2b_512 -> m Blake2b_512 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2b_512 -> m Blake2b_512 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2b_512 -> m Blake2b_512 #

Data Blake2bp_512 
Instance details

Defined in Crypto.Hash.Blake2bp

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Blake2bp_512 -> c Blake2bp_512 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Blake2bp_512 #

toConstr :: Blake2bp_512 -> Constr #

dataTypeOf :: Blake2bp_512 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Blake2bp_512) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Blake2bp_512) #

gmapT :: (forall b. Data b => b -> b) -> Blake2bp_512 -> Blake2bp_512 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Blake2bp_512 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Blake2bp_512 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Blake2bp_512 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Blake2bp_512 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Blake2bp_512 -> m Blake2bp_512 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2bp_512 -> m Blake2bp_512 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2bp_512 -> m Blake2bp_512 #

Data Blake2s_160 
Instance details

Defined in Crypto.Hash.Blake2s

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Blake2s_160 -> c Blake2s_160 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Blake2s_160 #

toConstr :: Blake2s_160 -> Constr #

dataTypeOf :: Blake2s_160 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Blake2s_160) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Blake2s_160) #

gmapT :: (forall b. Data b => b -> b) -> Blake2s_160 -> Blake2s_160 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Blake2s_160 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Blake2s_160 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Blake2s_160 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Blake2s_160 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Blake2s_160 -> m Blake2s_160 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2s_160 -> m Blake2s_160 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2s_160 -> m Blake2s_160 #

Data Blake2s_224 
Instance details

Defined in Crypto.Hash.Blake2s

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Blake2s_224 -> c Blake2s_224 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Blake2s_224 #

toConstr :: Blake2s_224 -> Constr #

dataTypeOf :: Blake2s_224 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Blake2s_224) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Blake2s_224) #

gmapT :: (forall b. Data b => b -> b) -> Blake2s_224 -> Blake2s_224 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Blake2s_224 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Blake2s_224 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Blake2s_224 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Blake2s_224 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Blake2s_224 -> m Blake2s_224 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2s_224 -> m Blake2s_224 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2s_224 -> m Blake2s_224 #

Data Blake2s_256 
Instance details

Defined in Crypto.Hash.Blake2s

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Blake2s_256 -> c Blake2s_256 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Blake2s_256 #

toConstr :: Blake2s_256 -> Constr #

dataTypeOf :: Blake2s_256 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Blake2s_256) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Blake2s_256) #

gmapT :: (forall b. Data b => b -> b) -> Blake2s_256 -> Blake2s_256 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Blake2s_256 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Blake2s_256 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Blake2s_256 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Blake2s_256 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Blake2s_256 -> m Blake2s_256 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2s_256 -> m Blake2s_256 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2s_256 -> m Blake2s_256 #

Data Blake2sp_224 
Instance details

Defined in Crypto.Hash.Blake2sp

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Blake2sp_224 -> c Blake2sp_224 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Blake2sp_224 #

toConstr :: Blake2sp_224 -> Constr #

dataTypeOf :: Blake2sp_224 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Blake2sp_224) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Blake2sp_224) #

gmapT :: (forall b. Data b => b -> b) -> Blake2sp_224 -> Blake2sp_224 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Blake2sp_224 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Blake2sp_224 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Blake2sp_224 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Blake2sp_224 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Blake2sp_224 -> m Blake2sp_224 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2sp_224 -> m Blake2sp_224 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2sp_224 -> m Blake2sp_224 #

Data Blake2sp_256 
Instance details

Defined in Crypto.Hash.Blake2sp

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Blake2sp_256 -> c Blake2sp_256 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Blake2sp_256 #

toConstr :: Blake2sp_256 -> Constr #

dataTypeOf :: Blake2sp_256 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Blake2sp_256) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Blake2sp_256) #

gmapT :: (forall b. Data b => b -> b) -> Blake2sp_256 -> Blake2sp_256 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Blake2sp_256 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Blake2sp_256 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Blake2sp_256 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Blake2sp_256 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Blake2sp_256 -> m Blake2sp_256 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2sp_256 -> m Blake2sp_256 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2sp_256 -> m Blake2sp_256 #

Data Keccak_224 
Instance details

Defined in Crypto.Hash.Keccak

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Keccak_224 -> c Keccak_224 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Keccak_224 #

toConstr :: Keccak_224 -> Constr #

dataTypeOf :: Keccak_224 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Keccak_224) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Keccak_224) #

gmapT :: (forall b. Data b => b -> b) -> Keccak_224 -> Keccak_224 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Keccak_224 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Keccak_224 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Keccak_224 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Keccak_224 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Keccak_224 -> m Keccak_224 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Keccak_224 -> m Keccak_224 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Keccak_224 -> m Keccak_224 #

Data Keccak_256 
Instance details

Defined in Crypto.Hash.Keccak

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Keccak_256 -> c Keccak_256 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Keccak_256 #

toConstr :: Keccak_256 -> Constr #

dataTypeOf :: Keccak_256 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Keccak_256) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Keccak_256) #

gmapT :: (forall b. Data b => b -> b) -> Keccak_256 -> Keccak_256 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Keccak_256 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Keccak_256 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Keccak_256 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Keccak_256 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Keccak_256 -> m Keccak_256 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Keccak_256 -> m Keccak_256 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Keccak_256 -> m Keccak_256 #

Data Keccak_384 
Instance details

Defined in Crypto.Hash.Keccak

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Keccak_384 -> c Keccak_384 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Keccak_384 #

toConstr :: Keccak_384 -> Constr #

dataTypeOf :: Keccak_384 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Keccak_384) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Keccak_384) #

gmapT :: (forall b. Data b => b -> b) -> Keccak_384 -> Keccak_384 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Keccak_384 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Keccak_384 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Keccak_384 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Keccak_384 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Keccak_384 -> m Keccak_384 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Keccak_384 -> m Keccak_384 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Keccak_384 -> m Keccak_384 #

Data Keccak_512 
Instance details

Defined in Crypto.Hash.Keccak

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Keccak_512 -> c Keccak_512 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Keccak_512 #

toConstr :: Keccak_512 -> Constr #

dataTypeOf :: Keccak_512 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Keccak_512) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Keccak_512) #

gmapT :: (forall b. Data b => b -> b) -> Keccak_512 -> Keccak_512 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Keccak_512 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Keccak_512 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Keccak_512 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Keccak_512 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Keccak_512 -> m Keccak_512 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Keccak_512 -> m Keccak_512 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Keccak_512 -> m Keccak_512 #

Data MD2 
Instance details

Defined in Crypto.Hash.MD2

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> MD2 -> c MD2 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c MD2 #

toConstr :: MD2 -> Constr #

dataTypeOf :: MD2 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c MD2) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c MD2) #

gmapT :: (forall b. Data b => b -> b) -> MD2 -> MD2 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> MD2 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> MD2 -> r #

gmapQ :: (forall d. Data d => d -> u) -> MD2 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> MD2 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> MD2 -> m MD2 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> MD2 -> m MD2 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> MD2 -> m MD2 #

Data MD4 
Instance details

Defined in Crypto.Hash.MD4

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> MD4 -> c MD4 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c MD4 #

toConstr :: MD4 -> Constr #

dataTypeOf :: MD4 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c MD4) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c MD4) #

gmapT :: (forall b. Data b => b -> b) -> MD4 -> MD4 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> MD4 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> MD4 -> r #

gmapQ :: (forall d. Data d => d -> u) -> MD4 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> MD4 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> MD4 -> m MD4 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> MD4 -> m MD4 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> MD4 -> m MD4 #

Data MD5 
Instance details

Defined in Crypto.Hash.MD5

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> MD5 -> c MD5 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c MD5 #

toConstr :: MD5 -> Constr #

dataTypeOf :: MD5 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c MD5) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c MD5) #

gmapT :: (forall b. Data b => b -> b) -> MD5 -> MD5 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> MD5 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> MD5 -> r #

gmapQ :: (forall d. Data d => d -> u) -> MD5 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> MD5 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> MD5 -> m MD5 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> MD5 -> m MD5 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> MD5 -> m MD5 #

Data RIPEMD160 
Instance details

Defined in Crypto.Hash.RIPEMD160

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RIPEMD160 -> c RIPEMD160 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RIPEMD160 #

toConstr :: RIPEMD160 -> Constr #

dataTypeOf :: RIPEMD160 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RIPEMD160) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RIPEMD160) #

gmapT :: (forall b. Data b => b -> b) -> RIPEMD160 -> RIPEMD160 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RIPEMD160 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RIPEMD160 -> r #

gmapQ :: (forall d. Data d => d -> u) -> RIPEMD160 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> RIPEMD160 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RIPEMD160 -> m RIPEMD160 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RIPEMD160 -> m RIPEMD160 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RIPEMD160 -> m RIPEMD160 #

Data SHA1 
Instance details

Defined in Crypto.Hash.SHA1

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SHA1 -> c SHA1 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SHA1 #

toConstr :: SHA1 -> Constr #

dataTypeOf :: SHA1 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SHA1) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SHA1) #

gmapT :: (forall b. Data b => b -> b) -> SHA1 -> SHA1 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SHA1 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SHA1 -> r #

gmapQ :: (forall d. Data d => d -> u) -> SHA1 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SHA1 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SHA1 -> m SHA1 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA1 -> m SHA1 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA1 -> m SHA1 #

Data SHA224 
Instance details

Defined in Crypto.Hash.SHA224

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SHA224 -> c SHA224 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SHA224 #

toConstr :: SHA224 -> Constr #

dataTypeOf :: SHA224 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SHA224) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SHA224) #

gmapT :: (forall b. Data b => b -> b) -> SHA224 -> SHA224 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SHA224 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SHA224 -> r #

gmapQ :: (forall d. Data d => d -> u) -> SHA224 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SHA224 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SHA224 -> m SHA224 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA224 -> m SHA224 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA224 -> m SHA224 #

Data SHA256 
Instance details

Defined in Crypto.Hash.SHA256

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SHA256 -> c SHA256 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SHA256 #

toConstr :: SHA256 -> Constr #

dataTypeOf :: SHA256 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SHA256) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SHA256) #

gmapT :: (forall b. Data b => b -> b) -> SHA256 -> SHA256 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SHA256 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SHA256 -> r #

gmapQ :: (forall d. Data d => d -> u) -> SHA256 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SHA256 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SHA256 -> m SHA256 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA256 -> m SHA256 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA256 -> m SHA256 #

Data SHA3_224 
Instance details

Defined in Crypto.Hash.SHA3

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SHA3_224 -> c SHA3_224 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SHA3_224 #

toConstr :: SHA3_224 -> Constr #

dataTypeOf :: SHA3_224 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SHA3_224) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SHA3_224) #

gmapT :: (forall b. Data b => b -> b) -> SHA3_224 -> SHA3_224 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SHA3_224 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SHA3_224 -> r #

gmapQ :: (forall d. Data d => d -> u) -> SHA3_224 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SHA3_224 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SHA3_224 -> m SHA3_224 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA3_224 -> m SHA3_224 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA3_224 -> m SHA3_224 #

Data SHA3_256 
Instance details

Defined in Crypto.Hash.SHA3

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SHA3_256 -> c SHA3_256 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SHA3_256 #

toConstr :: SHA3_256 -> Constr #

dataTypeOf :: SHA3_256 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SHA3_256) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SHA3_256) #

gmapT :: (forall b. Data b => b -> b) -> SHA3_256 -> SHA3_256 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SHA3_256 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SHA3_256 -> r #

gmapQ :: (forall d. Data d => d -> u) -> SHA3_256 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SHA3_256 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SHA3_256 -> m SHA3_256 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA3_256 -> m SHA3_256 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA3_256 -> m SHA3_256 #

Data SHA3_384 
Instance details

Defined in Crypto.Hash.SHA3

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SHA3_384 -> c SHA3_384 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SHA3_384 #

toConstr :: SHA3_384 -> Constr #

dataTypeOf :: SHA3_384 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SHA3_384) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SHA3_384) #

gmapT :: (forall b. Data b => b -> b) -> SHA3_384 -> SHA3_384 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SHA3_384 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SHA3_384 -> r #

gmapQ :: (forall d. Data d => d -> u) -> SHA3_384 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SHA3_384 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SHA3_384 -> m SHA3_384 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA3_384 -> m SHA3_384 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA3_384 -> m SHA3_384 #

Data SHA3_512 
Instance details

Defined in Crypto.Hash.SHA3

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SHA3_512 -> c SHA3_512 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SHA3_512 #

toConstr :: SHA3_512 -> Constr #

dataTypeOf :: SHA3_512 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SHA3_512) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SHA3_512) #

gmapT :: (forall b. Data b => b -> b) -> SHA3_512 -> SHA3_512 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SHA3_512 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SHA3_512 -> r #

gmapQ :: (forall d. Data d => d -> u) -> SHA3_512 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SHA3_512 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SHA3_512 -> m SHA3_512 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA3_512 -> m SHA3_512 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA3_512 -> m SHA3_512 #

Data SHA384 
Instance details

Defined in Crypto.Hash.SHA384

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SHA384 -> c SHA384 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SHA384 #

toConstr :: SHA384 -> Constr #

dataTypeOf :: SHA384 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SHA384) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SHA384) #

gmapT :: (forall b. Data b => b -> b) -> SHA384 -> SHA384 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SHA384 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SHA384 -> r #

gmapQ :: (forall d. Data d => d -> u) -> SHA384 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SHA384 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SHA384 -> m SHA384 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA384 -> m SHA384 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA384 -> m SHA384 #

Data SHA512 
Instance details

Defined in Crypto.Hash.SHA512

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SHA512 -> c SHA512 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SHA512 #

toConstr :: SHA512 -> Constr #

dataTypeOf :: SHA512 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SHA512) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SHA512) #

gmapT :: (forall b. Data b => b -> b) -> SHA512 -> SHA512 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SHA512 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SHA512 -> r #

gmapQ :: (forall d. Data d => d -> u) -> SHA512 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SHA512 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SHA512 -> m SHA512 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA512 -> m SHA512 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA512 -> m SHA512 #

Data SHA512t_224 
Instance details

Defined in Crypto.Hash.SHA512t

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SHA512t_224 -> c SHA512t_224 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SHA512t_224 #

toConstr :: SHA512t_224 -> Constr #

dataTypeOf :: SHA512t_224 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SHA512t_224) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SHA512t_224) #

gmapT :: (forall b. Data b => b -> b) -> SHA512t_224 -> SHA512t_224 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SHA512t_224 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SHA512t_224 -> r #

gmapQ :: (forall d. Data d => d -> u) -> SHA512t_224 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SHA512t_224 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SHA512t_224 -> m SHA512t_224 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA512t_224 -> m SHA512t_224 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA512t_224 -> m SHA512t_224 #

Data SHA512t_256 
Instance details

Defined in Crypto.Hash.SHA512t

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SHA512t_256 -> c SHA512t_256 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SHA512t_256 #

toConstr :: SHA512t_256 -> Constr #

dataTypeOf :: SHA512t_256 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SHA512t_256) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SHA512t_256) #

gmapT :: (forall b. Data b => b -> b) -> SHA512t_256 -> SHA512t_256 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SHA512t_256 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SHA512t_256 -> r #

gmapQ :: (forall d. Data d => d -> u) -> SHA512t_256 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SHA512t_256 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SHA512t_256 -> m SHA512t_256 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA512t_256 -> m SHA512t_256 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA512t_256 -> m SHA512t_256 #

Data Skein256_224 
Instance details

Defined in Crypto.Hash.Skein256

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Skein256_224 -> c Skein256_224 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Skein256_224 #

toConstr :: Skein256_224 -> Constr #

dataTypeOf :: Skein256_224 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Skein256_224) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Skein256_224) #

gmapT :: (forall b. Data b => b -> b) -> Skein256_224 -> Skein256_224 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Skein256_224 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Skein256_224 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Skein256_224 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Skein256_224 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Skein256_224 -> m Skein256_224 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Skein256_224 -> m Skein256_224 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Skein256_224 -> m Skein256_224 #

Data Skein256_256 
Instance details

Defined in Crypto.Hash.Skein256

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Skein256_256 -> c Skein256_256 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Skein256_256 #

toConstr :: Skein256_256 -> Constr #

dataTypeOf :: Skein256_256 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Skein256_256) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Skein256_256) #

gmapT :: (forall b. Data b => b -> b) -> Skein256_256 -> Skein256_256 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Skein256_256 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Skein256_256 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Skein256_256 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Skein256_256 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Skein256_256 -> m Skein256_256 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Skein256_256 -> m Skein256_256 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Skein256_256 -> m Skein256_256 #

Data Skein512_224 
Instance details

Defined in Crypto.Hash.Skein512

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Skein512_224 -> c Skein512_224 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Skein512_224 #

toConstr :: Skein512_224 -> Constr #

dataTypeOf :: Skein512_224 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Skein512_224) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Skein512_224) #

gmapT :: (forall b. Data b => b -> b) -> Skein512_224 -> Skein512_224 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Skein512_224 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Skein512_224 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Skein512_224 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Skein512_224 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Skein512_224 -> m Skein512_224 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Skein512_224 -> m Skein512_224 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Skein512_224 -> m Skein512_224 #

Data Skein512_256 
Instance details

Defined in Crypto.Hash.Skein512

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Skein512_256 -> c Skein512_256 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Skein512_256 #

toConstr :: Skein512_256 -> Constr #

dataTypeOf :: Skein512_256 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Skein512_256) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Skein512_256) #

gmapT :: (forall b. Data b => b -> b) -> Skein512_256 -> Skein512_256 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Skein512_256 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Skein512_256 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Skein512_256 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Skein512_256 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Skein512_256 -> m Skein512_256 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Skein512_256 -> m Skein512_256 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Skein512_256 -> m Skein512_256 #

Data Skein512_384 
Instance details

Defined in Crypto.Hash.Skein512

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Skein512_384 -> c Skein512_384 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Skein512_384 #

toConstr :: Skein512_384 -> Constr #

dataTypeOf :: Skein512_384 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Skein512_384) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Skein512_384) #

gmapT :: (forall b. Data b => b -> b) -> Skein512_384 -> Skein512_384 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Skein512_384 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Skein512_384 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Skein512_384 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Skein512_384 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Skein512_384 -> m Skein512_384 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Skein512_384 -> m Skein512_384 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Skein512_384 -> m Skein512_384 #

Data Skein512_512 
Instance details

Defined in Crypto.Hash.Skein512

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Skein512_512 -> c Skein512_512 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Skein512_512 #

toConstr :: Skein512_512 -> Constr #

dataTypeOf :: Skein512_512 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Skein512_512) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Skein512_512) #

gmapT :: (forall b. Data b => b -> b) -> Skein512_512 -> Skein512_512 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Skein512_512 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Skein512_512 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Skein512_512 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Skein512_512 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Skein512_512 -> m Skein512_512 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Skein512_512 -> m Skein512_512 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Skein512_512 -> m Skein512_512 #

Data Tiger 
Instance details

Defined in Crypto.Hash.Tiger

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Tiger -> c Tiger #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Tiger #

toConstr :: Tiger -> Constr #

dataTypeOf :: Tiger -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Tiger) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Tiger) #

gmapT :: (forall b. Data b => b -> b) -> Tiger -> Tiger #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Tiger -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Tiger -> r #

gmapQ :: (forall d. Data d => d -> u) -> Tiger -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Tiger -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Tiger -> m Tiger #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Tiger -> m Tiger #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Tiger -> m Tiger #

Data Whirlpool 
Instance details

Defined in Crypto.Hash.Whirlpool

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Whirlpool -> c Whirlpool #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Whirlpool #

toConstr :: Whirlpool -> Constr #

dataTypeOf :: Whirlpool -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Whirlpool) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Whirlpool) #

gmapT :: (forall b. Data b => b -> b) -> Whirlpool -> Whirlpool #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Whirlpool -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Whirlpool -> r #

gmapQ :: (forall d. Data d => d -> u) -> Whirlpool -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Whirlpool -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Whirlpool -> m Whirlpool #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Whirlpool -> m Whirlpool #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Whirlpool -> m Whirlpool #

Data ByteArray 
Instance details

Defined in Data.Array.Byte

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ByteArray -> c ByteArray #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ByteArray #

toConstr :: ByteArray -> Constr #

dataTypeOf :: ByteArray -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ByteArray) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ByteArray) #

gmapT :: (forall b. Data b => b -> b) -> ByteArray -> ByteArray #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ByteArray -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ByteArray -> r #

gmapQ :: (forall d. Data d => d -> u) -> ByteArray -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ByteArray -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ByteArray -> m ByteArray #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ByteArray -> m ByteArray #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ByteArray -> m ByteArray #

Data Ordering

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Ordering -> c Ordering #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Ordering #

toConstr :: Ordering -> Constr #

dataTypeOf :: Ordering -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Ordering) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Ordering) #

gmapT :: (forall b. Data b => b -> b) -> Ordering -> Ordering #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Ordering -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Ordering -> r #

gmapQ :: (forall d. Data d => d -> u) -> Ordering -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Ordering -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Ordering -> m Ordering #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Ordering -> m Ordering #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Ordering -> m Ordering #

Data ByteRange 
Instance details

Defined in Network.HTTP.Types.Header

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ByteRange -> c ByteRange #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ByteRange #

toConstr :: ByteRange -> Constr #

dataTypeOf :: ByteRange -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ByteRange) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ByteRange) #

gmapT :: (forall b. Data b => b -> b) -> ByteRange -> ByteRange #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ByteRange -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ByteRange -> r #

gmapQ :: (forall d. Data d => d -> u) -> ByteRange -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ByteRange -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ByteRange -> m ByteRange #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ByteRange -> m ByteRange #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ByteRange -> m ByteRange #

Data IP 
Instance details

Defined in Data.IP.Addr

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IP -> c IP #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IP #

toConstr :: IP -> Constr #

dataTypeOf :: IP -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IP) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IP) #

gmapT :: (forall b. Data b => b -> b) -> IP -> IP #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IP -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IP -> r #

gmapQ :: (forall d. Data d => d -> u) -> IP -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IP -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IP -> m IP #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IP -> m IP #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IP -> m IP #

Data IPv4 
Instance details

Defined in Data.IP.Addr

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IPv4 -> c IPv4 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IPv4 #

toConstr :: IPv4 -> Constr #

dataTypeOf :: IPv4 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IPv4) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IPv4) #

gmapT :: (forall b. Data b => b -> b) -> IPv4 -> IPv4 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IPv4 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IPv4 -> r #

gmapQ :: (forall d. Data d => d -> u) -> IPv4 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IPv4 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IPv4 -> m IPv4 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IPv4 -> m IPv4 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IPv4 -> m IPv4 #

Data IPv6 
Instance details

Defined in Data.IP.Addr

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IPv6 -> c IPv6 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IPv6 #

toConstr :: IPv6 -> Constr #

dataTypeOf :: IPv6 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IPv6) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IPv6) #

gmapT :: (forall b. Data b => b -> b) -> IPv6 -> IPv6 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IPv6 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IPv6 -> r #

gmapQ :: (forall d. Data d => d -> u) -> IPv6 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IPv6 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IPv6 -> m IPv6 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IPv6 -> m IPv6 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IPv6 -> m IPv6 #

Data IPRange 
Instance details

Defined in Data.IP.Range

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IPRange -> c IPRange #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IPRange #

toConstr :: IPRange -> Constr #

dataTypeOf :: IPRange -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IPRange) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IPRange) #

gmapT :: (forall b. Data b => b -> b) -> IPRange -> IPRange #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IPRange -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IPRange -> r #

gmapQ :: (forall d. Data d => d -> u) -> IPRange -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IPRange -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IPRange -> m IPRange #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IPRange -> m IPRange #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IPRange -> m IPRange #

Data URI 
Instance details

Defined in Network.URI

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> URI -> c URI #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c URI #

toConstr :: URI -> Constr #

dataTypeOf :: URI -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c URI) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c URI) #

gmapT :: (forall b. Data b => b -> b) -> URI -> URI #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> URI -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> URI -> r #

gmapQ :: (forall d. Data d => d -> u) -> URI -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> URI -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> URI -> m URI #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> URI -> m URI #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> URI -> m URI #

Data URIAuth 
Instance details

Defined in Network.URI

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> URIAuth -> c URIAuth #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c URIAuth #

toConstr :: URIAuth -> Constr #

dataTypeOf :: URIAuth -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c URIAuth) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c URIAuth) #

gmapT :: (forall b. Data b => b -> b) -> URIAuth -> URIAuth #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> URIAuth -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> URIAuth -> r #

gmapQ :: (forall d. Data d => d -> u) -> URIAuth -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> URIAuth -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> URIAuth -> m URIAuth #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> URIAuth -> m URIAuth #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> URIAuth -> m URIAuth #

Data Scientific 
Instance details

Defined in Data.Scientific

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Scientific -> c Scientific #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Scientific #

toConstr :: Scientific -> Constr #

dataTypeOf :: Scientific -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Scientific) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Scientific) #

gmapT :: (forall b. Data b => b -> b) -> Scientific -> Scientific #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Scientific -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Scientific -> r #

gmapQ :: (forall d. Data d => d -> u) -> Scientific -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Scientific -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Scientific -> m Scientific #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Scientific -> m Scientific #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Scientific -> m Scientific #

Data AnnLookup 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AnnLookup -> c AnnLookup #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AnnLookup #

toConstr :: AnnLookup -> Constr #

dataTypeOf :: AnnLookup -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AnnLookup) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AnnLookup) #

gmapT :: (forall b. Data b => b -> b) -> AnnLookup -> AnnLookup #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AnnLookup -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AnnLookup -> r #

gmapQ :: (forall d. Data d => d -> u) -> AnnLookup -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AnnLookup -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AnnLookup -> m AnnLookup #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnLookup -> m AnnLookup #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnLookup -> m AnnLookup #

Data AnnTarget 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AnnTarget -> c AnnTarget #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AnnTarget #

toConstr :: AnnTarget -> Constr #

dataTypeOf :: AnnTarget -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AnnTarget) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AnnTarget) #

gmapT :: (forall b. Data b => b -> b) -> AnnTarget -> AnnTarget #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AnnTarget -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AnnTarget -> r #

gmapQ :: (forall d. Data d => d -> u) -> AnnTarget -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AnnTarget -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AnnTarget -> m AnnTarget #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnTarget -> m AnnTarget #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnTarget -> m AnnTarget #

Data Bang 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Bang -> c Bang #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Bang #

toConstr :: Bang -> Constr #

dataTypeOf :: Bang -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Bang) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Bang) #

gmapT :: (forall b. Data b => b -> b) -> Bang -> Bang #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Bang -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Bang -> r #

gmapQ :: (forall d. Data d => d -> u) -> Bang -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Bang -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Bang -> m Bang #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Bang -> m Bang #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Bang -> m Bang #

Data Body 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Body -> c Body #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Body #

toConstr :: Body -> Constr #

dataTypeOf :: Body -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Body) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Body) #

gmapT :: (forall b. Data b => b -> b) -> Body -> Body #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Body -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Body -> r #

gmapQ :: (forall d. Data d => d -> u) -> Body -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Body -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Body -> m Body #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Body -> m Body #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Body -> m Body #

Data Bytes 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Bytes -> c Bytes #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Bytes #

toConstr :: Bytes -> Constr #

dataTypeOf :: Bytes -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Bytes) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Bytes) #

gmapT :: (forall b. Data b => b -> b) -> Bytes -> Bytes #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Bytes -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Bytes -> r #

gmapQ :: (forall d. Data d => d -> u) -> Bytes -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Bytes -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Bytes -> m Bytes #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Bytes -> m Bytes #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Bytes -> m Bytes #

Data Callconv 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Callconv -> c Callconv #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Callconv #

toConstr :: Callconv -> Constr #

dataTypeOf :: Callconv -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Callconv) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Callconv) #

gmapT :: (forall b. Data b => b -> b) -> Callconv -> Callconv #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Callconv -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Callconv -> r #

gmapQ :: (forall d. Data d => d -> u) -> Callconv -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Callconv -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Callconv -> m Callconv #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Callconv -> m Callconv #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Callconv -> m Callconv #

Data Clause 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Clause -> c Clause #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Clause #

toConstr :: Clause -> Constr #

dataTypeOf :: Clause -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Clause) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Clause) #

gmapT :: (forall b. Data b => b -> b) -> Clause -> Clause #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Clause -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Clause -> r #

gmapQ :: (forall d. Data d => d -> u) -> Clause -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Clause -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Clause -> m Clause #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Clause -> m Clause #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Clause -> m Clause #

Data Con 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Con -> c Con #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Con #

toConstr :: Con -> Constr #

dataTypeOf :: Con -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Con) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Con) #

gmapT :: (forall b. Data b => b -> b) -> Con -> Con #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Con -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Con -> r #

gmapQ :: (forall d. Data d => d -> u) -> Con -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Con -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Con -> m Con #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Con -> m Con #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Con -> m Con #

Data Dec 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Dec -> c Dec #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Dec #

toConstr :: Dec -> Constr #

dataTypeOf :: Dec -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Dec) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Dec) #

gmapT :: (forall b. Data b => b -> b) -> Dec -> Dec #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Dec -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Dec -> r #

gmapQ :: (forall d. Data d => d -> u) -> Dec -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Dec -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Dec -> m Dec #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Dec -> m Dec #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Dec -> m Dec #

Data DecidedStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DecidedStrictness -> c DecidedStrictness #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DecidedStrictness #

toConstr :: DecidedStrictness -> Constr #

dataTypeOf :: DecidedStrictness -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DecidedStrictness) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DecidedStrictness) #

gmapT :: (forall b. Data b => b -> b) -> DecidedStrictness -> DecidedStrictness #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DecidedStrictness -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DecidedStrictness -> r #

gmapQ :: (forall d. Data d => d -> u) -> DecidedStrictness -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DecidedStrictness -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DecidedStrictness -> m DecidedStrictness #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DecidedStrictness -> m DecidedStrictness #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DecidedStrictness -> m DecidedStrictness #

Data DerivClause 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DerivClause -> c DerivClause #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DerivClause #

toConstr :: DerivClause -> Constr #

dataTypeOf :: DerivClause -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DerivClause) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DerivClause) #

gmapT :: (forall b. Data b => b -> b) -> DerivClause -> DerivClause #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DerivClause -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DerivClause -> r #

gmapQ :: (forall d. Data d => d -> u) -> DerivClause -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DerivClause -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DerivClause -> m DerivClause #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DerivClause -> m DerivClause #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DerivClause -> m DerivClause #

Data DerivStrategy 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DerivStrategy -> c DerivStrategy #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DerivStrategy #

toConstr :: DerivStrategy -> Constr #

dataTypeOf :: DerivStrategy -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DerivStrategy) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DerivStrategy) #

gmapT :: (forall b. Data b => b -> b) -> DerivStrategy -> DerivStrategy #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DerivStrategy -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DerivStrategy -> r #

gmapQ :: (forall d. Data d => d -> u) -> DerivStrategy -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DerivStrategy -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DerivStrategy -> m DerivStrategy #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DerivStrategy -> m DerivStrategy #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DerivStrategy -> m DerivStrategy #

Data DocLoc 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DocLoc -> c DocLoc #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DocLoc #

toConstr :: DocLoc -> Constr #

dataTypeOf :: DocLoc -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DocLoc) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DocLoc) #

gmapT :: (forall b. Data b => b -> b) -> DocLoc -> DocLoc #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DocLoc -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DocLoc -> r #

gmapQ :: (forall d. Data d => d -> u) -> DocLoc -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DocLoc -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DocLoc -> m DocLoc #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DocLoc -> m DocLoc #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DocLoc -> m DocLoc #

Data Exp 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Exp -> c Exp #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Exp #

toConstr :: Exp -> Constr #

dataTypeOf :: Exp -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Exp) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Exp) #

gmapT :: (forall b. Data b => b -> b) -> Exp -> Exp #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Exp -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Exp -> r #

gmapQ :: (forall d. Data d => d -> u) -> Exp -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Exp -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Exp -> m Exp #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Exp -> m Exp #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Exp -> m Exp #

Data FamilyResultSig 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FamilyResultSig -> c FamilyResultSig #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FamilyResultSig #

toConstr :: FamilyResultSig -> Constr #

dataTypeOf :: FamilyResultSig -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c FamilyResultSig) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FamilyResultSig) #

gmapT :: (forall b. Data b => b -> b) -> FamilyResultSig -> FamilyResultSig #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FamilyResultSig -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FamilyResultSig -> r #

gmapQ :: (forall d. Data d => d -> u) -> FamilyResultSig -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FamilyResultSig -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FamilyResultSig -> m FamilyResultSig #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FamilyResultSig -> m FamilyResultSig #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FamilyResultSig -> m FamilyResultSig #

Data Fixity 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Fixity -> c Fixity #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Fixity #

toConstr :: Fixity -> Constr #

dataTypeOf :: Fixity -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Fixity) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Fixity) #

gmapT :: (forall b. Data b => b -> b) -> Fixity -> Fixity #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Fixity -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Fixity -> r #

gmapQ :: (forall d. Data d => d -> u) -> Fixity -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Fixity -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Fixity -> m Fixity #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Fixity -> m Fixity #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Fixity -> m Fixity #

Data FixityDirection 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FixityDirection -> c FixityDirection #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FixityDirection #

toConstr :: FixityDirection -> Constr #

dataTypeOf :: FixityDirection -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c FixityDirection) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FixityDirection) #

gmapT :: (forall b. Data b => b -> b) -> FixityDirection -> FixityDirection #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FixityDirection -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FixityDirection -> r #

gmapQ :: (forall d. Data d => d -> u) -> FixityDirection -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FixityDirection -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FixityDirection -> m FixityDirection #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FixityDirection -> m FixityDirection #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FixityDirection -> m FixityDirection #

Data Foreign 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Foreign -> c Foreign #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Foreign #

toConstr :: Foreign -> Constr #

dataTypeOf :: Foreign -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Foreign) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Foreign) #

gmapT :: (forall b. Data b => b -> b) -> Foreign -> Foreign #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Foreign -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Foreign -> r #

gmapQ :: (forall d. Data d => d -> u) -> Foreign -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Foreign -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Foreign -> m Foreign #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Foreign -> m Foreign #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Foreign -> m Foreign #

Data FunDep 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FunDep -> c FunDep #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FunDep #

toConstr :: FunDep -> Constr #

dataTypeOf :: FunDep -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c FunDep) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FunDep) #

gmapT :: (forall b. Data b => b -> b) -> FunDep -> FunDep #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FunDep -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FunDep -> r #

gmapQ :: (forall d. Data d => d -> u) -> FunDep -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FunDep -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FunDep -> m FunDep #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FunDep -> m FunDep #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FunDep -> m FunDep #

Data Guard 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Guard -> c Guard #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Guard #

toConstr :: Guard -> Constr #

dataTypeOf :: Guard -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Guard) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Guard) #

gmapT :: (forall b. Data b => b -> b) -> Guard -> Guard #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Guard -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Guard -> r #

gmapQ :: (forall d. Data d => d -> u) -> Guard -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Guard -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Guard -> m Guard #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Guard -> m Guard #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Guard -> m Guard #

Data Info 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Info -> c Info #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Info #

toConstr :: Info -> Constr #

dataTypeOf :: Info -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Info) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Info) #

gmapT :: (forall b. Data b => b -> b) -> Info -> Info #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Info -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Info -> r #

gmapQ :: (forall d. Data d => d -> u) -> Info -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Info -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Info -> m Info #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Info -> m Info #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Info -> m Info #

Data InjectivityAnn 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> InjectivityAnn -> c InjectivityAnn #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c InjectivityAnn #

toConstr :: InjectivityAnn -> Constr #

dataTypeOf :: InjectivityAnn -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c InjectivityAnn) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c InjectivityAnn) #

gmapT :: (forall b. Data b => b -> b) -> InjectivityAnn -> InjectivityAnn #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> InjectivityAnn -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> InjectivityAnn -> r #

gmapQ :: (forall d. Data d => d -> u) -> InjectivityAnn -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> InjectivityAnn -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> InjectivityAnn -> m InjectivityAnn #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> InjectivityAnn -> m InjectivityAnn #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> InjectivityAnn -> m InjectivityAnn #

Data Inline 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Inline -> c Inline #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Inline #

toConstr :: Inline -> Constr #

dataTypeOf :: Inline -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Inline) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Inline) #

gmapT :: (forall b. Data b => b -> b) -> Inline -> Inline #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Inline -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Inline -> r #

gmapQ :: (forall d. Data d => d -> u) -> Inline -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Inline -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Inline -> m Inline #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Inline -> m Inline #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Inline -> m Inline #

Data Lit 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Lit -> c Lit #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Lit #

toConstr :: Lit -> Constr #

dataTypeOf :: Lit -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Lit) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Lit) #

gmapT :: (forall b. Data b => b -> b) -> Lit -> Lit #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Lit -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Lit -> r #

gmapQ :: (forall d. Data d => d -> u) -> Lit -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Lit -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Lit -> m Lit #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Lit -> m Lit #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Lit -> m Lit #

Data Loc 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Loc -> c Loc #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Loc #

toConstr :: Loc -> Constr #

dataTypeOf :: Loc -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Loc) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Loc) #

gmapT :: (forall b. Data b => b -> b) -> Loc -> Loc #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Loc -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Loc -> r #

gmapQ :: (forall d. Data d => d -> u) -> Loc -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Loc -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Loc -> m Loc #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Loc -> m Loc #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Loc -> m Loc #

Data Match 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Match -> c Match #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Match #

toConstr :: Match -> Constr #

dataTypeOf :: Match -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Match) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Match) #

gmapT :: (forall b. Data b => b -> b) -> Match -> Match #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Match -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Match -> r #

gmapQ :: (forall d. Data d => d -> u) -> Match -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Match -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Match -> m Match #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Match -> m Match #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Match -> m Match #

Data ModName 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ModName -> c ModName #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ModName #

toConstr :: ModName -> Constr #

dataTypeOf :: ModName -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ModName) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ModName) #

gmapT :: (forall b. Data b => b -> b) -> ModName -> ModName #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ModName -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ModName -> r #

gmapQ :: (forall d. Data d => d -> u) -> ModName -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ModName -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ModName -> m ModName #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ModName -> m ModName #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ModName -> m ModName #

Data Module 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Module -> c Module #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Module #

toConstr :: Module -> Constr #

dataTypeOf :: Module -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Module) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Module) #

gmapT :: (forall b. Data b => b -> b) -> Module -> Module #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Module -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Module -> r #

gmapQ :: (forall d. Data d => d -> u) -> Module -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Module -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Module -> m Module #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Module -> m Module #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Module -> m Module #

Data ModuleInfo 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ModuleInfo -> c ModuleInfo #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ModuleInfo #

toConstr :: ModuleInfo -> Constr #

dataTypeOf :: ModuleInfo -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ModuleInfo) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ModuleInfo) #

gmapT :: (forall b. Data b => b -> b) -> ModuleInfo -> ModuleInfo #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ModuleInfo -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ModuleInfo -> r #

gmapQ :: (forall d. Data d => d -> u) -> ModuleInfo -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ModuleInfo -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ModuleInfo -> m ModuleInfo #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ModuleInfo -> m ModuleInfo #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ModuleInfo -> m ModuleInfo #

Data Name 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Name -> c Name #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Name #

toConstr :: Name -> Constr #

dataTypeOf :: Name -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Name) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Name) #

gmapT :: (forall b. Data b => b -> b) -> Name -> Name #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Name -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Name -> r #

gmapQ :: (forall d. Data d => d -> u) -> Name -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Name -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Name -> m Name #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Name -> m Name #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Name -> m Name #

Data NameFlavour 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NameFlavour -> c NameFlavour #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NameFlavour #

toConstr :: NameFlavour -> Constr #

dataTypeOf :: NameFlavour -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NameFlavour) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NameFlavour) #

gmapT :: (forall b. Data b => b -> b) -> NameFlavour -> NameFlavour #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NameFlavour -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NameFlavour -> r #

gmapQ :: (forall d. Data d => d -> u) -> NameFlavour -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> NameFlavour -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NameFlavour -> m NameFlavour #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NameFlavour -> m NameFlavour #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NameFlavour -> m NameFlavour #

Data NameSpace 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NameSpace -> c NameSpace #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NameSpace #

toConstr :: NameSpace -> Constr #

dataTypeOf :: NameSpace -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NameSpace) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NameSpace) #

gmapT :: (forall b. Data b => b -> b) -> NameSpace -> NameSpace #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NameSpace -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NameSpace -> r #

gmapQ :: (forall d. Data d => d -> u) -> NameSpace -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> NameSpace -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NameSpace -> m NameSpace #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NameSpace -> m NameSpace #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NameSpace -> m NameSpace #

Data OccName 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OccName -> c OccName #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OccName #

toConstr :: OccName -> Constr #

dataTypeOf :: OccName -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OccName) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OccName) #

gmapT :: (forall b. Data b => b -> b) -> OccName -> OccName #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OccName -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OccName -> r #

gmapQ :: (forall d. Data d => d -> u) -> OccName -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OccName -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OccName -> m OccName #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OccName -> m OccName #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OccName -> m OccName #

Data Overlap 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Overlap -> c Overlap #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Overlap #

toConstr :: Overlap -> Constr #

dataTypeOf :: Overlap -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Overlap) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Overlap) #

gmapT :: (forall b. Data b => b -> b) -> Overlap -> Overlap #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Overlap -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Overlap -> r #

gmapQ :: (forall d. Data d => d -> u) -> Overlap -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Overlap -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Overlap -> m Overlap #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Overlap -> m Overlap #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Overlap -> m Overlap #

Data Pat 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Pat -> c Pat #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Pat #

toConstr :: Pat -> Constr #

dataTypeOf :: Pat -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Pat) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Pat) #

gmapT :: (forall b. Data b => b -> b) -> Pat -> Pat #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Pat -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Pat -> r #

gmapQ :: (forall d. Data d => d -> u) -> Pat -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Pat -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Pat -> m Pat #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Pat -> m Pat #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Pat -> m Pat #

Data PatSynArgs 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PatSynArgs -> c PatSynArgs #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PatSynArgs #

toConstr :: PatSynArgs -> Constr #

dataTypeOf :: PatSynArgs -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PatSynArgs) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PatSynArgs) #

gmapT :: (forall b. Data b => b -> b) -> PatSynArgs -> PatSynArgs #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PatSynArgs -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PatSynArgs -> r #

gmapQ :: (forall d. Data d => d -> u) -> PatSynArgs -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PatSynArgs -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PatSynArgs -> m PatSynArgs #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PatSynArgs -> m PatSynArgs #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PatSynArgs -> m PatSynArgs #

Data PatSynDir 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PatSynDir -> c PatSynDir #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PatSynDir #

toConstr :: PatSynDir -> Constr #

dataTypeOf :: PatSynDir -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PatSynDir) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PatSynDir) #

gmapT :: (forall b. Data b => b -> b) -> PatSynDir -> PatSynDir #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PatSynDir -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PatSynDir -> r #

gmapQ :: (forall d. Data d => d -> u) -> PatSynDir -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PatSynDir -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PatSynDir -> m PatSynDir #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PatSynDir -> m PatSynDir #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PatSynDir -> m PatSynDir #

Data Phases 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Phases -> c Phases #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Phases #

toConstr :: Phases -> Constr #

dataTypeOf :: Phases -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Phases) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Phases) #

gmapT :: (forall b. Data b => b -> b) -> Phases -> Phases #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Phases -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Phases -> r #

gmapQ :: (forall d. Data d => d -> u) -> Phases -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Phases -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Phases -> m Phases #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Phases -> m Phases #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Phases -> m Phases #

Data PkgName 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PkgName -> c PkgName #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PkgName #

toConstr :: PkgName -> Constr #

dataTypeOf :: PkgName -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PkgName) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PkgName) #

gmapT :: (forall b. Data b => b -> b) -> PkgName -> PkgName #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PkgName -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PkgName -> r #

gmapQ :: (forall d. Data d => d -> u) -> PkgName -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PkgName -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PkgName -> m PkgName #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PkgName -> m PkgName #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PkgName -> m PkgName #

Data Pragma 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Pragma -> c Pragma #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Pragma #

toConstr :: Pragma -> Constr #

dataTypeOf :: Pragma -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Pragma) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Pragma) #

gmapT :: (forall b. Data b => b -> b) -> Pragma -> Pragma #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Pragma -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Pragma -> r #

gmapQ :: (forall d. Data d => d -> u) -> Pragma -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Pragma -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Pragma -> m Pragma #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Pragma -> m Pragma #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Pragma -> m Pragma #

Data Range 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Range -> c Range #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Range #

toConstr :: Range -> Constr #

dataTypeOf :: Range -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Range) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Range) #

gmapT :: (forall b. Data b => b -> b) -> Range -> Range #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Range -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Range -> r #

gmapQ :: (forall d. Data d => d -> u) -> Range -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Range -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Range -> m Range #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Range -> m Range #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Range -> m Range #

Data Role 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Role -> c Role #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Role #

toConstr :: Role -> Constr #

dataTypeOf :: Role -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Role) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Role) #

gmapT :: (forall b. Data b => b -> b) -> Role -> Role #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Role -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Role -> r #

gmapQ :: (forall d. Data d => d -> u) -> Role -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Role -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Role -> m Role #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Role -> m Role #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Role -> m Role #

Data RuleBndr 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RuleBndr -> c RuleBndr #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RuleBndr #

toConstr :: RuleBndr -> Constr #

dataTypeOf :: RuleBndr -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RuleBndr) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RuleBndr) #

gmapT :: (forall b. Data b => b -> b) -> RuleBndr -> RuleBndr #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RuleBndr -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RuleBndr -> r #

gmapQ :: (forall d. Data d => d -> u) -> RuleBndr -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> RuleBndr -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RuleBndr -> m RuleBndr #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RuleBndr -> m RuleBndr #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RuleBndr -> m RuleBndr #

Data RuleMatch 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RuleMatch -> c RuleMatch #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RuleMatch #

toConstr :: RuleMatch -> Constr #

dataTypeOf :: RuleMatch -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RuleMatch) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RuleMatch) #

gmapT :: (forall b. Data b => b -> b) -> RuleMatch -> RuleMatch #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RuleMatch -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RuleMatch -> r #

gmapQ :: (forall d. Data d => d -> u) -> RuleMatch -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> RuleMatch -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RuleMatch -> m RuleMatch #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RuleMatch -> m RuleMatch #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RuleMatch -> m RuleMatch #

Data Safety 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Safety -> c Safety #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Safety #

toConstr :: Safety -> Constr #

dataTypeOf :: Safety -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Safety) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Safety) #

gmapT :: (forall b. Data b => b -> b) -> Safety -> Safety #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Safety -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Safety -> r #

gmapQ :: (forall d. Data d => d -> u) -> Safety -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Safety -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Safety -> m Safety #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Safety -> m Safety #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Safety -> m Safety #

Data SourceStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SourceStrictness -> c SourceStrictness #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SourceStrictness #

toConstr :: SourceStrictness -> Constr #

dataTypeOf :: SourceStrictness -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SourceStrictness) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SourceStrictness) #

gmapT :: (forall b. Data b => b -> b) -> SourceStrictness -> SourceStrictness #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SourceStrictness -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SourceStrictness -> r #

gmapQ :: (forall d. Data d => d -> u) -> SourceStrictness -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SourceStrictness -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SourceStrictness -> m SourceStrictness #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SourceStrictness -> m SourceStrictness #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SourceStrictness -> m SourceStrictness #

Data SourceUnpackedness 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SourceUnpackedness -> c SourceUnpackedness #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SourceUnpackedness #

toConstr :: SourceUnpackedness -> Constr #

dataTypeOf :: SourceUnpackedness -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SourceUnpackedness) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SourceUnpackedness) #

gmapT :: (forall b. Data b => b -> b) -> SourceUnpackedness -> SourceUnpackedness #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SourceUnpackedness -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SourceUnpackedness -> r #

gmapQ :: (forall d. Data d => d -> u) -> SourceUnpackedness -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SourceUnpackedness -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SourceUnpackedness -> m SourceUnpackedness #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SourceUnpackedness -> m SourceUnpackedness #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SourceUnpackedness -> m SourceUnpackedness #

Data Specificity 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Specificity -> c Specificity #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Specificity #

toConstr :: Specificity -> Constr #

dataTypeOf :: Specificity -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Specificity) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Specificity) #

gmapT :: (forall b. Data b => b -> b) -> Specificity -> Specificity #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Specificity -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Specificity -> r #

gmapQ :: (forall d. Data d => d -> u) -> Specificity -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Specificity -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Specificity -> m Specificity #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Specificity -> m Specificity #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Specificity -> m Specificity #

Data Stmt 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Stmt -> c Stmt #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Stmt #

toConstr :: Stmt -> Constr #

dataTypeOf :: Stmt -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Stmt) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Stmt) #

gmapT :: (forall b. Data b => b -> b) -> Stmt -> Stmt #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Stmt -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Stmt -> r #

gmapQ :: (forall d. Data d => d -> u) -> Stmt -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Stmt -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Stmt -> m Stmt #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Stmt -> m Stmt #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Stmt -> m Stmt #

Data TyLit 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TyLit -> c TyLit #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TyLit #

toConstr :: TyLit -> Constr #

dataTypeOf :: TyLit -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TyLit) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TyLit) #

gmapT :: (forall b. Data b => b -> b) -> TyLit -> TyLit #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TyLit -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TyLit -> r #

gmapQ :: (forall d. Data d => d -> u) -> TyLit -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TyLit -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TyLit -> m TyLit #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TyLit -> m TyLit #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TyLit -> m TyLit #

Data TySynEqn 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TySynEqn -> c TySynEqn #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TySynEqn #

toConstr :: TySynEqn -> Constr #

dataTypeOf :: TySynEqn -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TySynEqn) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TySynEqn) #

gmapT :: (forall b. Data b => b -> b) -> TySynEqn -> TySynEqn #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TySynEqn -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TySynEqn -> r #

gmapQ :: (forall d. Data d => d -> u) -> TySynEqn -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TySynEqn -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TySynEqn -> m TySynEqn #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TySynEqn -> m TySynEqn #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TySynEqn -> m TySynEqn #

Data Type 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Type -> c Type #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Type #

toConstr :: Type -> Constr #

dataTypeOf :: Type -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Type) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Type) #

gmapT :: (forall b. Data b => b -> b) -> Type -> Type #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Type -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Type -> r #

gmapQ :: (forall d. Data d => d -> u) -> Type -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Type -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Type -> m Type #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Type -> m Type #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Type -> m Type #

Data TypeFamilyHead 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TypeFamilyHead -> c TypeFamilyHead #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TypeFamilyHead #

toConstr :: TypeFamilyHead -> Constr #

dataTypeOf :: TypeFamilyHead -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TypeFamilyHead) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TypeFamilyHead) #

gmapT :: (forall b. Data b => b -> b) -> TypeFamilyHead -> TypeFamilyHead #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TypeFamilyHead -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TypeFamilyHead -> r #

gmapQ :: (forall d. Data d => d -> u) -> TypeFamilyHead -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TypeFamilyHead -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TypeFamilyHead -> m TypeFamilyHead #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TypeFamilyHead -> m TypeFamilyHead #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TypeFamilyHead -> m TypeFamilyHead #

Data ShortText

It exposes a similar Data instance abstraction as Text (see discussion referenced there for more details), preserving the [Char] data abstraction at the cost of inefficiency.

Since: text-short-0.1.3

Instance details

Defined in Data.Text.Short.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ShortText -> c ShortText #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ShortText #

toConstr :: ShortText -> Constr #

dataTypeOf :: ShortText -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ShortText) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ShortText) #

gmapT :: (forall b. Data b => b -> b) -> ShortText -> ShortText #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ShortText -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ShortText -> r #

gmapQ :: (forall d. Data d => d -> u) -> ShortText -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ShortText -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ShortText -> m ShortText #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ShortText -> m ShortText #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ShortText -> m ShortText #

Data ConstructorInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ConstructorInfo -> c ConstructorInfo #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ConstructorInfo #

toConstr :: ConstructorInfo -> Constr #

dataTypeOf :: ConstructorInfo -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ConstructorInfo) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ConstructorInfo) #

gmapT :: (forall b. Data b => b -> b) -> ConstructorInfo -> ConstructorInfo #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ConstructorInfo -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ConstructorInfo -> r #

gmapQ :: (forall d. Data d => d -> u) -> ConstructorInfo -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ConstructorInfo -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ConstructorInfo -> m ConstructorInfo #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ConstructorInfo -> m ConstructorInfo #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ConstructorInfo -> m ConstructorInfo #

Data ConstructorVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ConstructorVariant -> c ConstructorVariant #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ConstructorVariant #

toConstr :: ConstructorVariant -> Constr #

dataTypeOf :: ConstructorVariant -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ConstructorVariant) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ConstructorVariant) #

gmapT :: (forall b. Data b => b -> b) -> ConstructorVariant -> ConstructorVariant #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ConstructorVariant -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ConstructorVariant -> r #

gmapQ :: (forall d. Data d => d -> u) -> ConstructorVariant -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ConstructorVariant -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ConstructorVariant -> m ConstructorVariant #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ConstructorVariant -> m ConstructorVariant #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ConstructorVariant -> m ConstructorVariant #

Data DatatypeInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DatatypeInfo -> c DatatypeInfo #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DatatypeInfo #

toConstr :: DatatypeInfo -> Constr #

dataTypeOf :: DatatypeInfo -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DatatypeInfo) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DatatypeInfo) #

gmapT :: (forall b. Data b => b -> b) -> DatatypeInfo -> DatatypeInfo #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DatatypeInfo -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DatatypeInfo -> r #

gmapQ :: (forall d. Data d => d -> u) -> DatatypeInfo -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DatatypeInfo -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DatatypeInfo -> m DatatypeInfo #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DatatypeInfo -> m DatatypeInfo #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DatatypeInfo -> m DatatypeInfo #

Data DatatypeVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DatatypeVariant -> c DatatypeVariant #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DatatypeVariant #

toConstr :: DatatypeVariant -> Constr #

dataTypeOf :: DatatypeVariant -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DatatypeVariant) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DatatypeVariant) #

gmapT :: (forall b. Data b => b -> b) -> DatatypeVariant -> DatatypeVariant #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DatatypeVariant -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DatatypeVariant -> r #

gmapQ :: (forall d. Data d => d -> u) -> DatatypeVariant -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DatatypeVariant -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DatatypeVariant -> m DatatypeVariant #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DatatypeVariant -> m DatatypeVariant #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DatatypeVariant -> m DatatypeVariant #

Data FieldStrictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FieldStrictness -> c FieldStrictness #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FieldStrictness #

toConstr :: FieldStrictness -> Constr #

dataTypeOf :: FieldStrictness -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c FieldStrictness) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FieldStrictness) #

gmapT :: (forall b. Data b => b -> b) -> FieldStrictness -> FieldStrictness #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FieldStrictness -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FieldStrictness -> r #

gmapQ :: (forall d. Data d => d -> u) -> FieldStrictness -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FieldStrictness -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FieldStrictness -> m FieldStrictness #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FieldStrictness -> m FieldStrictness #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FieldStrictness -> m FieldStrictness #

Data Strictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Strictness -> c Strictness #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Strictness #

toConstr :: Strictness -> Constr #

dataTypeOf :: Strictness -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Strictness) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Strictness) #

gmapT :: (forall b. Data b => b -> b) -> Strictness -> Strictness #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Strictness -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Strictness -> r #

gmapQ :: (forall d. Data d => d -> u) -> Strictness -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Strictness -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Strictness -> m Strictness #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Strictness -> m Strictness #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Strictness -> m Strictness #

Data Unpackedness 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Unpackedness -> c Unpackedness #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Unpackedness #

toConstr :: Unpackedness -> Constr #

dataTypeOf :: Unpackedness -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Unpackedness) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Unpackedness) #

gmapT :: (forall b. Data b => b -> b) -> Unpackedness -> Unpackedness #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Unpackedness -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Unpackedness -> r #

gmapQ :: (forall d. Data d => d -> u) -> Unpackedness -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Unpackedness -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Unpackedness -> m Unpackedness #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Unpackedness -> m Unpackedness #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Unpackedness -> m Unpackedness #

Data Day 
Instance details

Defined in Data.Time.Calendar.Days

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Day -> c Day #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Day #

toConstr :: Day -> Constr #

dataTypeOf :: Day -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Day) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Day) #

gmapT :: (forall b. Data b => b -> b) -> Day -> Day #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Day -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Day -> r #

gmapQ :: (forall d. Data d => d -> u) -> Day -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Day -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Day -> m Day #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Day -> m Day #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Day -> m Day #

Data AbsoluteTime 
Instance details

Defined in Data.Time.Clock.Internal.AbsoluteTime

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AbsoluteTime -> c AbsoluteTime #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AbsoluteTime #

toConstr :: AbsoluteTime -> Constr #

dataTypeOf :: AbsoluteTime -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AbsoluteTime) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AbsoluteTime) #

gmapT :: (forall b. Data b => b -> b) -> AbsoluteTime -> AbsoluteTime #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AbsoluteTime -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AbsoluteTime -> r #

gmapQ :: (forall d. Data d => d -> u) -> AbsoluteTime -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AbsoluteTime -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AbsoluteTime -> m AbsoluteTime #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AbsoluteTime -> m AbsoluteTime #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AbsoluteTime -> m AbsoluteTime #

Data DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DiffTime -> c DiffTime #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DiffTime #

toConstr :: DiffTime -> Constr #

dataTypeOf :: DiffTime -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DiffTime) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DiffTime) #

gmapT :: (forall b. Data b => b -> b) -> DiffTime -> DiffTime #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DiffTime -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DiffTime -> r #

gmapQ :: (forall d. Data d => d -> u) -> DiffTime -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DiffTime -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DiffTime -> m DiffTime #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DiffTime -> m DiffTime #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DiffTime -> m DiffTime #

Data UTCTime 
Instance details

Defined in Data.Time.Clock.Internal.UTCTime

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UTCTime -> c UTCTime #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UTCTime #

toConstr :: UTCTime -> Constr #

dataTypeOf :: UTCTime -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UTCTime) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UTCTime) #

gmapT :: (forall b. Data b => b -> b) -> UTCTime -> UTCTime #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UTCTime -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UTCTime -> r #

gmapQ :: (forall d. Data d => d -> u) -> UTCTime -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UTCTime -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UTCTime -> m UTCTime #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UTCTime -> m UTCTime #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UTCTime -> m UTCTime #

Data UniversalTime 
Instance details

Defined in Data.Time.Clock.Internal.UniversalTime

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UniversalTime -> c UniversalTime #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UniversalTime #

toConstr :: UniversalTime -> Constr #

dataTypeOf :: UniversalTime -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UniversalTime) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UniversalTime) #

gmapT :: (forall b. Data b => b -> b) -> UniversalTime -> UniversalTime #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UniversalTime -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UniversalTime -> r #

gmapQ :: (forall d. Data d => d -> u) -> UniversalTime -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UniversalTime -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UniversalTime -> m UniversalTime #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UniversalTime -> m UniversalTime #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UniversalTime -> m UniversalTime #

Data LocalTime 
Instance details

Defined in Data.Time.LocalTime.Internal.LocalTime

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LocalTime -> c LocalTime #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c LocalTime #

toConstr :: LocalTime -> Constr #

dataTypeOf :: LocalTime -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LocalTime) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c LocalTime) #

gmapT :: (forall b. Data b => b -> b) -> LocalTime -> LocalTime #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LocalTime -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LocalTime -> r #

gmapQ :: (forall d. Data d => d -> u) -> LocalTime -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> LocalTime -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> LocalTime -> m LocalTime #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LocalTime -> m LocalTime #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LocalTime -> m LocalTime #

Data ZonedTime 
Instance details

Defined in Data.Time.LocalTime.Internal.ZonedTime

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ZonedTime -> c ZonedTime #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ZonedTime #

toConstr :: ZonedTime -> Constr #

dataTypeOf :: ZonedTime -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ZonedTime) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ZonedTime) #

gmapT :: (forall b. Data b => b -> b) -> ZonedTime -> ZonedTime #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ZonedTime -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ZonedTime -> r #

gmapQ :: (forall d. Data d => d -> u) -> ZonedTime -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ZonedTime -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ZonedTime -> m ZonedTime #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ZonedTime -> m ZonedTime #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ZonedTime -> m ZonedTime #

Data UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UUID -> c UUID #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UUID #

toConstr :: UUID -> Constr #

dataTypeOf :: UUID -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UUID) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UUID) #

gmapT :: (forall b. Data b => b -> b) -> UUID -> UUID #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UUID -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UUID -> r #

gmapQ :: (forall d. Data d => d -> u) -> UUID -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UUID -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UUID -> m UUID #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UUID -> m UUID #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UUID -> m UUID #

Data Content 
Instance details

Defined in Data.XML.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Content -> c Content #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Content #

toConstr :: Content -> Constr #

dataTypeOf :: Content -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Content) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Content) #

gmapT :: (forall b. Data b => b -> b) -> Content -> Content #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Content -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Content -> r #

gmapQ :: (forall d. Data d => d -> u) -> Content -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Content -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Content -> m Content #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Content -> m Content #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Content -> m Content #

Data Doctype 
Instance details

Defined in Data.XML.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Doctype -> c Doctype #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Doctype #

toConstr :: Doctype -> Constr #

dataTypeOf :: Doctype -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Doctype) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Doctype) #

gmapT :: (forall b. Data b => b -> b) -> Doctype -> Doctype #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Doctype -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Doctype -> r #

gmapQ :: (forall d. Data d => d -> u) -> Doctype -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Doctype -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Doctype -> m Doctype #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Doctype -> m Doctype #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Doctype -> m Doctype #

Data Document 
Instance details

Defined in Data.XML.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Document -> c Document #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Document #

toConstr :: Document -> Constr #

dataTypeOf :: Document -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Document) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Document) #

gmapT :: (forall b. Data b => b -> b) -> Document -> Document #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Document -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Document -> r #

gmapQ :: (forall d. Data d => d -> u) -> Document -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Document -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Document -> m Document #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Document -> m Document #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Document -> m Document #

Data Element 
Instance details

Defined in Data.XML.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Element -> c Element #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Element #

toConstr :: Element -> Constr #

dataTypeOf :: Element -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Element) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Element) #

gmapT :: (forall b. Data b => b -> b) -> Element -> Element #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Element -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Element -> r #

gmapQ :: (forall d. Data d => d -> u) -> Element -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Element -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Element -> m Element #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Element -> m Element #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Element -> m Element #

Data Event 
Instance details

Defined in Data.XML.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Event -> c Event #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Event #

toConstr :: Event -> Constr #

dataTypeOf :: Event -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Event) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Event) #

gmapT :: (forall b. Data b => b -> b) -> Event -> Event #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Event -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Event -> r #

gmapQ :: (forall d. Data d => d -> u) -> Event -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Event -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Event -> m Event #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Event -> m Event #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Event -> m Event #

Data ExternalID 
Instance details

Defined in Data.XML.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ExternalID -> c ExternalID #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ExternalID #

toConstr :: ExternalID -> Constr #

dataTypeOf :: ExternalID -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ExternalID) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ExternalID) #

gmapT :: (forall b. Data b => b -> b) -> ExternalID -> ExternalID #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ExternalID -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ExternalID -> r #

gmapQ :: (forall d. Data d => d -> u) -> ExternalID -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ExternalID -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ExternalID -> m ExternalID #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ExternalID -> m ExternalID #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ExternalID -> m ExternalID #

Data Instruction 
Instance details

Defined in Data.XML.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Instruction -> c Instruction #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Instruction #

toConstr :: Instruction -> Constr #

dataTypeOf :: Instruction -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Instruction) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Instruction) #

gmapT :: (forall b. Data b => b -> b) -> Instruction -> Instruction #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Instruction -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Instruction -> r #

gmapQ :: (forall d. Data d => d -> u) -> Instruction -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Instruction -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Instruction -> m Instruction #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Instruction -> m Instruction #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Instruction -> m Instruction #

Data Miscellaneous 
Instance details

Defined in Data.XML.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Miscellaneous -> c Miscellaneous #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Miscellaneous #

toConstr :: Miscellaneous -> Constr #

dataTypeOf :: Miscellaneous -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Miscellaneous) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Miscellaneous) #

gmapT :: (forall b. Data b => b -> b) -> Miscellaneous -> Miscellaneous #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Miscellaneous -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Miscellaneous -> r #

gmapQ :: (forall d. Data d => d -> u) -> Miscellaneous -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Miscellaneous -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Miscellaneous -> m Miscellaneous #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Miscellaneous -> m Miscellaneous #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Miscellaneous -> m Miscellaneous #

Data Name 
Instance details

Defined in Data.XML.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Name -> c Name #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Name #

toConstr :: Name -> Constr #

dataTypeOf :: Name -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Name) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Name) #

gmapT :: (forall b. Data b => b -> b) -> Name -> Name #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Name -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Name -> r #

gmapQ :: (forall d. Data d => d -> u) -> Name -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Name -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Name -> m Name #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Name -> m Name #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Name -> m Name #

Data Node 
Instance details

Defined in Data.XML.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Node -> c Node #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Node #

toConstr :: Node -> Constr #

dataTypeOf :: Node -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Node) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Node) #

gmapT :: (forall b. Data b => b -> b) -> Node -> Node #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Node -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Node -> r #

gmapQ :: (forall d. Data d => d -> u) -> Node -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Node -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Node -> m Node #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Node -> m Node #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Node -> m Node #

Data Prologue 
Instance details

Defined in Data.XML.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Prologue -> c Prologue #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Prologue #

toConstr :: Prologue -> Constr #

dataTypeOf :: Prologue -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Prologue) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Prologue) #

gmapT :: (forall b. Data b => b -> b) -> Prologue -> Prologue #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Prologue -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Prologue -> r #

gmapQ :: (forall d. Data d => d -> u) -> Prologue -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Prologue -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Prologue -> m Prologue #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Prologue -> m Prologue #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Prologue -> m Prologue #

Data Integer

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Integer -> c Integer #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Integer #

toConstr :: Integer -> Constr #

dataTypeOf :: Integer -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Integer) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Integer) #

gmapT :: (forall b. Data b => b -> b) -> Integer -> Integer #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Integer -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Integer -> r #

gmapQ :: (forall d. Data d => d -> u) -> Integer -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Integer -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Integer -> m Integer #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Integer -> m Integer #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Integer -> m Integer #

Data Natural

Since: base-4.8.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Natural -> c Natural #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Natural #

toConstr :: Natural -> Constr #

dataTypeOf :: Natural -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Natural) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Natural) #

gmapT :: (forall b. Data b => b -> b) -> Natural -> Natural #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Natural -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Natural -> r #

gmapQ :: (forall d. Data d => d -> u) -> Natural -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Natural -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Natural -> m Natural #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Natural -> m Natural #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Natural -> m Natural #

Data ()

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> () -> c () #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c () #

toConstr :: () -> Constr #

dataTypeOf :: () -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ()) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ()) #

gmapT :: (forall b. Data b => b -> b) -> () -> () #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> () -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> () -> r #

gmapQ :: (forall d. Data d => d -> u) -> () -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> () -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> () -> m () #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> () -> m () #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> () -> m () #

Data Bool

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Bool -> c Bool #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Bool #

toConstr :: Bool -> Constr #

dataTypeOf :: Bool -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Bool) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Bool) #

gmapT :: (forall b. Data b => b -> b) -> Bool -> Bool #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Bool -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Bool -> r #

gmapQ :: (forall d. Data d => d -> u) -> Bool -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Bool -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Bool -> m Bool #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Bool -> m Bool #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Bool -> m Bool #

Data Char

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Char -> c Char #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Char #

toConstr :: Char -> Constr #

dataTypeOf :: Char -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Char) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Char) #

gmapT :: (forall b. Data b => b -> b) -> Char -> Char #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Char -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Char -> r #

gmapQ :: (forall d. Data d => d -> u) -> Char -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Char -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Char -> m Char #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Char -> m Char #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Char -> m Char #

Data Double

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Double -> c Double #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Double #

toConstr :: Double -> Constr #

dataTypeOf :: Double -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Double) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Double) #

gmapT :: (forall b. Data b => b -> b) -> Double -> Double #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Double -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Double -> r #

gmapQ :: (forall d. Data d => d -> u) -> Double -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Double -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Double -> m Double #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Double -> m Double #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Double -> m Double #

Data Float

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Float -> c Float #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Float #

toConstr :: Float -> Constr #

dataTypeOf :: Float -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Float) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Float) #

gmapT :: (forall b. Data b => b -> b) -> Float -> Float #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Float -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Float -> r #

gmapQ :: (forall d. Data d => d -> u) -> Float -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Float -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Float -> m Float #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Float -> m Float #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Float -> m Float #

Data Int

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Int -> c Int #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Int #

toConstr :: Int -> Constr #

dataTypeOf :: Int -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Int) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Int) #

gmapT :: (forall b. Data b => b -> b) -> Int -> Int #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Int -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Int -> r #

gmapQ :: (forall d. Data d => d -> u) -> Int -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Int -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Int -> m Int #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Int -> m Int #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Int -> m Int #

Data Word

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Word -> c Word #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Word #

toConstr :: Word -> Constr #

dataTypeOf :: Word -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Word) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Word) #

gmapT :: (forall b. Data b => b -> b) -> Word -> Word #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Word -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Word -> r #

gmapQ :: (forall d. Data d => d -> u) -> Word -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Word -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Word -> m Word #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Word -> m Word #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Word -> m Word #

Data v => Data (KeyMap v) 
Instance details

Defined in Data.Aeson.KeyMap

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> KeyMap v -> c (KeyMap v) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (KeyMap v) #

toConstr :: KeyMap v -> Constr #

dataTypeOf :: KeyMap v -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (KeyMap v)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (KeyMap v)) #

gmapT :: (forall b. Data b => b -> b) -> KeyMap v -> KeyMap v #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> KeyMap v -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> KeyMap v -> r #

gmapQ :: (forall d. Data d => d -> u) -> KeyMap v -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> KeyMap v -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> KeyMap v -> m (KeyMap v) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> KeyMap v -> m (KeyMap v) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> KeyMap v -> m (KeyMap v) #

Data a => Data (ZipList a)

Since: base-4.14.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ZipList a -> c (ZipList a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ZipList a) #

toConstr :: ZipList a -> Constr #

dataTypeOf :: ZipList a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (ZipList a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ZipList a)) #

gmapT :: (forall b. Data b => b -> b) -> ZipList a -> ZipList a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ZipList a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ZipList a -> r #

gmapQ :: (forall d. Data d => d -> u) -> ZipList a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ZipList a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ZipList a -> m (ZipList a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ZipList a -> m (ZipList a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ZipList a -> m (ZipList a) #

Data a => Data (Complex a)

Since: base-2.1

Instance details

Defined in Data.Complex

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Complex a -> c (Complex a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Complex a) #

toConstr :: Complex a -> Constr #

dataTypeOf :: Complex a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Complex a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Complex a)) #

gmapT :: (forall b. Data b => b -> b) -> Complex a -> Complex a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Complex a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Complex a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Complex a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Complex a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Complex a -> m (Complex a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Complex a -> m (Complex a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Complex a -> m (Complex a) #

Data a => Data (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Identity a -> c (Identity a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Identity a) #

toConstr :: Identity a -> Constr #

dataTypeOf :: Identity a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Identity a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Identity a)) #

gmapT :: (forall b. Data b => b -> b) -> Identity a -> Identity a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Identity a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Identity a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Identity a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Identity a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Identity a -> m (Identity a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Identity a -> m (Identity a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Identity a -> m (Identity a) #

Data a => Data (First a)

Since: base-4.8.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> First a -> c (First a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (First a) #

toConstr :: First a -> Constr #

dataTypeOf :: First a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (First a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (First a)) #

gmapT :: (forall b. Data b => b -> b) -> First a -> First a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> First a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> First a -> r #

gmapQ :: (forall d. Data d => d -> u) -> First a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> First a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> First a -> m (First a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> First a -> m (First a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> First a -> m (First a) #

Data a => Data (Last a)

Since: base-4.8.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Last a -> c (Last a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Last a) #

toConstr :: Last a -> Constr #

dataTypeOf :: Last a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Last a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Last a)) #

gmapT :: (forall b. Data b => b -> b) -> Last a -> Last a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Last a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Last a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Last a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Last a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Last a -> m (Last a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Last a -> m (Last a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Last a -> m (Last a) #

Data a => Data (Down a)

Since: base-4.12.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Down a -> c (Down a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Down a) #

toConstr :: Down a -> Constr #

dataTypeOf :: Down a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Down a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Down a)) #

gmapT :: (forall b. Data b => b -> b) -> Down a -> Down a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Down a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Down a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Down a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Down a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Down a -> m (Down a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Down a -> m (Down a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Down a -> m (Down a) #

Data a => Data (First a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> First a -> c (First a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (First a) #

toConstr :: First a -> Constr #

dataTypeOf :: First a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (First a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (First a)) #

gmapT :: (forall b. Data b => b -> b) -> First a -> First a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> First a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> First a -> r #

gmapQ :: (forall d. Data d => d -> u) -> First a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> First a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> First a -> m (First a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> First a -> m (First a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> First a -> m (First a) #

Data a => Data (Last a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Last a -> c (Last a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Last a) #

toConstr :: Last a -> Constr #

dataTypeOf :: Last a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Last a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Last a)) #

gmapT :: (forall b. Data b => b -> b) -> Last a -> Last a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Last a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Last a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Last a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Last a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Last a -> m (Last a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Last a -> m (Last a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Last a -> m (Last a) #

Data a => Data (Max a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Max a -> c (Max a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Max a) #

toConstr :: Max a -> Constr #

dataTypeOf :: Max a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Max a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Max a)) #

gmapT :: (forall b. Data b => b -> b) -> Max a -> Max a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Max a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Max a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Max a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Max a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Max a -> m (Max a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Max a -> m (Max a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Max a -> m (Max a) #

Data a => Data (Min a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Min a -> c (Min a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Min a) #

toConstr :: Min a -> Constr #

dataTypeOf :: Min a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Min a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Min a)) #

gmapT :: (forall b. Data b => b -> b) -> Min a -> Min a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Min a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Min a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Min a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Min a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Min a -> m (Min a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Min a -> m (Min a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Min a -> m (Min a) #

Data m => Data (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> WrappedMonoid m -> c (WrappedMonoid m) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (WrappedMonoid m) #

toConstr :: WrappedMonoid m -> Constr #

dataTypeOf :: WrappedMonoid m -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (WrappedMonoid m)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (WrappedMonoid m)) #

gmapT :: (forall b. Data b => b -> b) -> WrappedMonoid m -> WrappedMonoid m #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WrappedMonoid m -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WrappedMonoid m -> r #

gmapQ :: (forall d. Data d => d -> u) -> WrappedMonoid m -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> WrappedMonoid m -> u #

gmapM :: Monad m0 => (forall d. Data d => d -> m0 d) -> WrappedMonoid m -> m0 (WrappedMonoid m) #

gmapMp :: MonadPlus m0 => (forall d. Data d => d -> m0 d) -> WrappedMonoid m -> m0 (WrappedMonoid m) #

gmapMo :: MonadPlus m0 => (forall d. Data d => d -> m0 d) -> WrappedMonoid m -> m0 (WrappedMonoid m) #

Data a => Data (Dual a)

Since: base-4.8.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Dual a -> c (Dual a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Dual a) #

toConstr :: Dual a -> Constr #

dataTypeOf :: Dual a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Dual a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Dual a)) #

gmapT :: (forall b. Data b => b -> b) -> Dual a -> Dual a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Dual a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Dual a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Dual a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Dual a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Dual a -> m (Dual a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Dual a -> m (Dual a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Dual a -> m (Dual a) #

Data a => Data (Product a)

Since: base-4.8.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Product a -> c (Product a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Product a) #

toConstr :: Product a -> Constr #

dataTypeOf :: Product a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Product a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Product a)) #

gmapT :: (forall b. Data b => b -> b) -> Product a -> Product a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Product a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Product a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Product a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Product a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Product a -> m (Product a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Product a -> m (Product a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Product a -> m (Product a) #

Data a => Data (Sum a)

Since: base-4.8.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Sum a -> c (Sum a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Sum a) #

toConstr :: Sum a -> Constr #

dataTypeOf :: Sum a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Sum a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Sum a)) #

gmapT :: (forall b. Data b => b -> b) -> Sum a -> Sum a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Sum a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Sum a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Sum a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Sum a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Sum a -> m (Sum a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Sum a -> m (Sum a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Sum a -> m (Sum a) #

Data a => Data (ForeignPtr a)

Since: base-4.8.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ForeignPtr a -> c (ForeignPtr a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ForeignPtr a) #

toConstr :: ForeignPtr a -> Constr #

dataTypeOf :: ForeignPtr a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (ForeignPtr a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ForeignPtr a)) #

gmapT :: (forall b. Data b => b -> b) -> ForeignPtr a -> ForeignPtr a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ForeignPtr a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ForeignPtr a -> r #

gmapQ :: (forall d. Data d => d -> u) -> ForeignPtr a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ForeignPtr a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ForeignPtr a -> m (ForeignPtr a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ForeignPtr a -> m (ForeignPtr a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ForeignPtr a -> m (ForeignPtr a) #

Data p => Data (Par1 p)

Since: base-4.9.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Par1 p -> c (Par1 p) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Par1 p) #

toConstr :: Par1 p -> Constr #

dataTypeOf :: Par1 p -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Par1 p)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Par1 p)) #

gmapT :: (forall b. Data b => b -> b) -> Par1 p -> Par1 p #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Par1 p -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Par1 p -> r #

gmapQ :: (forall d. Data d => d -> u) -> Par1 p -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Par1 p -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Par1 p -> m (Par1 p) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Par1 p -> m (Par1 p) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Par1 p -> m (Par1 p) #

Data a => Data (Ptr a)

Since: base-4.8.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Ptr a -> c (Ptr a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Ptr a) #

toConstr :: Ptr a -> Constr #

dataTypeOf :: Ptr a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Ptr a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Ptr a)) #

gmapT :: (forall b. Data b => b -> b) -> Ptr a -> Ptr a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Ptr a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Ptr a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Ptr a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Ptr a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Ptr a -> m (Ptr a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Ptr a -> m (Ptr a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Ptr a -> m (Ptr a) #

(Data a, Integral a) => Data (Ratio a)

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Ratio a -> c (Ratio a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Ratio a) #

toConstr :: Ratio a -> Constr #

dataTypeOf :: Ratio a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Ratio a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Ratio a)) #

gmapT :: (forall b. Data b => b -> b) -> Ratio a -> Ratio a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Ratio a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Ratio a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Ratio a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Ratio a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Ratio a -> m (Ratio a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Ratio a -> m (Ratio a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Ratio a -> m (Ratio a) #

Data ty => Data (Block ty) 
Instance details

Defined in Basement.Block.Base

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Block ty -> c (Block ty) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Block ty) #

toConstr :: Block ty -> Constr #

dataTypeOf :: Block ty -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Block ty)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Block ty)) #

gmapT :: (forall b. Data b => b -> b) -> Block ty -> Block ty #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Block ty -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Block ty -> r #

gmapQ :: (forall d. Data d => d -> u) -> Block ty -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Block ty -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Block ty -> m (Block ty) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Block ty -> m (Block ty) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Block ty -> m (Block ty) #

Data ty => Data (UArray ty) 
Instance details

Defined in Basement.UArray.Base

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UArray ty -> c (UArray ty) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (UArray ty) #

toConstr :: UArray ty -> Constr #

dataTypeOf :: UArray ty -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (UArray ty)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (UArray ty)) #

gmapT :: (forall b. Data b => b -> b) -> UArray ty -> UArray ty #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UArray ty -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UArray ty -> r #

gmapQ :: (forall d. Data d => d -> u) -> UArray ty -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UArray ty -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UArray ty -> m (UArray ty) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UArray ty -> m (UArray ty) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UArray ty -> m (UArray ty) #

Data vertex => Data (SCC vertex)

Since: containers-0.5.9

Instance details

Defined in Data.Graph

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SCC vertex -> c (SCC vertex) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (SCC vertex) #

toConstr :: SCC vertex -> Constr #

dataTypeOf :: SCC vertex -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (SCC vertex)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (SCC vertex)) #

gmapT :: (forall b. Data b => b -> b) -> SCC vertex -> SCC vertex #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SCC vertex -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SCC vertex -> r #

gmapQ :: (forall d. Data d => d -> u) -> SCC vertex -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SCC vertex -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SCC vertex -> m (SCC vertex) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SCC vertex -> m (SCC vertex) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SCC vertex -> m (SCC vertex) #

Data a => Data (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IntMap a -> c (IntMap a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (IntMap a) #

toConstr :: IntMap a -> Constr #

dataTypeOf :: IntMap a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (IntMap a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (IntMap a)) #

gmapT :: (forall b. Data b => b -> b) -> IntMap a -> IntMap a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IntMap a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IntMap a -> r #

gmapQ :: (forall d. Data d => d -> u) -> IntMap a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IntMap a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IntMap a -> m (IntMap a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IntMap a -> m (IntMap a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IntMap a -> m (IntMap a) #

Data a => Data (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Seq a -> c (Seq a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Seq a) #

toConstr :: Seq a -> Constr #

dataTypeOf :: Seq a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Seq a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Seq a)) #

gmapT :: (forall b. Data b => b -> b) -> Seq a -> Seq a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Seq a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Seq a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Seq a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Seq a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Seq a -> m (Seq a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Seq a -> m (Seq a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Seq a -> m (Seq a) #

Data a => Data (ViewL a) 
Instance details

Defined in Data.Sequence.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ViewL a -> c (ViewL a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ViewL a) #

toConstr :: ViewL a -> Constr #

dataTypeOf :: ViewL a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (ViewL a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ViewL a)) #

gmapT :: (forall b. Data b => b -> b) -> ViewL a -> ViewL a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ViewL a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ViewL a -> r #

gmapQ :: (forall d. Data d => d -> u) -> ViewL a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ViewL a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ViewL a -> m (ViewL a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ViewL a -> m (ViewL a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ViewL a -> m (ViewL a) #

Data a => Data (ViewR a) 
Instance details

Defined in Data.Sequence.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ViewR a -> c (ViewR a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ViewR a) #

toConstr :: ViewR a -> Constr #

dataTypeOf :: ViewR a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (ViewR a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ViewR a)) #

gmapT :: (forall b. Data b => b -> b) -> ViewR a -> ViewR a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ViewR a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ViewR a -> r #

gmapQ :: (forall d. Data d => d -> u) -> ViewR a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ViewR a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ViewR a -> m (ViewR a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ViewR a -> m (ViewR a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ViewR a -> m (ViewR a) #

(Data a, Ord a) => Data (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Set a -> c (Set a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Set a) #

toConstr :: Set a -> Constr #

dataTypeOf :: Set a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Set a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Set a)) #

gmapT :: (forall b. Data b => b -> b) -> Set a -> Set a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Set a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Set a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Set a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Set a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Set a -> m (Set a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Set a -> m (Set a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Set a -> m (Set a) #

Data a => Data (Tree a) 
Instance details

Defined in Data.Tree

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Tree a -> c (Tree a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Tree a) #

toConstr :: Tree a -> Constr #

dataTypeOf :: Tree a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Tree a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Tree a)) #

gmapT :: (forall b. Data b => b -> b) -> Tree a -> Tree a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Tree a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Tree a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Tree a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Tree a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Tree a -> m (Tree a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Tree a -> m (Tree a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Tree a -> m (Tree a) #

KnownNat bitlen => Data (Blake2b bitlen) 
Instance details

Defined in Crypto.Hash.Blake2

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Blake2b bitlen -> c (Blake2b bitlen) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Blake2b bitlen) #

toConstr :: Blake2b bitlen -> Constr #

dataTypeOf :: Blake2b bitlen -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Blake2b bitlen)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Blake2b bitlen)) #

gmapT :: (forall b. Data b => b -> b) -> Blake2b bitlen -> Blake2b bitlen #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Blake2b bitlen -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Blake2b bitlen -> r #

gmapQ :: (forall d. Data d => d -> u) -> Blake2b bitlen -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Blake2b bitlen -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Blake2b bitlen -> m (Blake2b bitlen) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2b bitlen -> m (Blake2b bitlen) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2b bitlen -> m (Blake2b bitlen) #

KnownNat bitlen => Data (Blake2bp bitlen) 
Instance details

Defined in Crypto.Hash.Blake2

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Blake2bp bitlen -> c (Blake2bp bitlen) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Blake2bp bitlen) #

toConstr :: Blake2bp bitlen -> Constr #

dataTypeOf :: Blake2bp bitlen -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Blake2bp bitlen)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Blake2bp bitlen)) #

gmapT :: (forall b. Data b => b -> b) -> Blake2bp bitlen -> Blake2bp bitlen #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Blake2bp bitlen -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Blake2bp bitlen -> r #

gmapQ :: (forall d. Data d => d -> u) -> Blake2bp bitlen -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Blake2bp bitlen -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Blake2bp bitlen -> m (Blake2bp bitlen) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2bp bitlen -> m (Blake2bp bitlen) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2bp bitlen -> m (Blake2bp bitlen) #

KnownNat bitlen => Data (Blake2s bitlen) 
Instance details

Defined in Crypto.Hash.Blake2

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Blake2s bitlen -> c (Blake2s bitlen) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Blake2s bitlen) #

toConstr :: Blake2s bitlen -> Constr #

dataTypeOf :: Blake2s bitlen -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Blake2s bitlen)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Blake2s bitlen)) #

gmapT :: (forall b. Data b => b -> b) -> Blake2s bitlen -> Blake2s bitlen #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Blake2s bitlen -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Blake2s bitlen -> r #

gmapQ :: (forall d. Data d => d -> u) -> Blake2s bitlen -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Blake2s bitlen -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Blake2s bitlen -> m (Blake2s bitlen) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2s bitlen -> m (Blake2s bitlen) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2s bitlen -> m (Blake2s bitlen) #

KnownNat bitlen => Data (Blake2sp bitlen) 
Instance details

Defined in Crypto.Hash.Blake2

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Blake2sp bitlen -> c (Blake2sp bitlen) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Blake2sp bitlen) #

toConstr :: Blake2sp bitlen -> Constr #

dataTypeOf :: Blake2sp bitlen -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Blake2sp bitlen)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Blake2sp bitlen)) #

gmapT :: (forall b. Data b => b -> b) -> Blake2sp bitlen -> Blake2sp bitlen #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Blake2sp bitlen -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Blake2sp bitlen -> r #

gmapQ :: (forall d. Data d => d -> u) -> Blake2sp bitlen -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Blake2sp bitlen -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Blake2sp bitlen -> m (Blake2sp bitlen) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2sp bitlen -> m (Blake2sp bitlen) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2sp bitlen -> m (Blake2sp bitlen) #

KnownNat bitlen => Data (SHAKE128 bitlen) 
Instance details

Defined in Crypto.Hash.SHAKE

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SHAKE128 bitlen -> c (SHAKE128 bitlen) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (SHAKE128 bitlen) #

toConstr :: SHAKE128 bitlen -> Constr #

dataTypeOf :: SHAKE128 bitlen -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (SHAKE128 bitlen)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (SHAKE128 bitlen)) #

gmapT :: (forall b. Data b => b -> b) -> SHAKE128 bitlen -> SHAKE128 bitlen #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SHAKE128 bitlen -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SHAKE128 bitlen -> r #

gmapQ :: (forall d. Data d => d -> u) -> SHAKE128 bitlen -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SHAKE128 bitlen -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SHAKE128 bitlen -> m (SHAKE128 bitlen) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SHAKE128 bitlen -> m (SHAKE128 bitlen) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SHAKE128 bitlen -> m (SHAKE128 bitlen) #

KnownNat bitlen => Data (SHAKE256 bitlen) 
Instance details

Defined in Crypto.Hash.SHAKE

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SHAKE256 bitlen -> c (SHAKE256 bitlen) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (SHAKE256 bitlen) #

toConstr :: SHAKE256 bitlen -> Constr #

dataTypeOf :: SHAKE256 bitlen -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (SHAKE256 bitlen)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (SHAKE256 bitlen)) #

gmapT :: (forall b. Data b => b -> b) -> SHAKE256 bitlen -> SHAKE256 bitlen #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SHAKE256 bitlen -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SHAKE256 bitlen -> r #

gmapQ :: (forall d. Data d => d -> u) -> SHAKE256 bitlen -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SHAKE256 bitlen -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SHAKE256 bitlen -> m (SHAKE256 bitlen) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SHAKE256 bitlen -> m (SHAKE256 bitlen) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SHAKE256 bitlen -> m (SHAKE256 bitlen) #

Data a => Data (Digest a) 
Instance details

Defined in Crypto.Hash.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Digest a -> c (Digest a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Digest a) #

toConstr :: Digest a -> Constr #

dataTypeOf :: Digest a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Digest a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Digest a)) #

gmapT :: (forall b. Data b => b -> b) -> Digest a -> Digest a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Digest a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Digest a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Digest a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Digest a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Digest a -> m (Digest a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Digest a -> m (Digest a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Digest a -> m (Digest a) #

Typeable s => Data (MutableByteArray s) 
Instance details

Defined in Data.Array.Byte

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> MutableByteArray s -> c (MutableByteArray s) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (MutableByteArray s) #

toConstr :: MutableByteArray s -> Constr #

dataTypeOf :: MutableByteArray s -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (MutableByteArray s)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (MutableByteArray s)) #

gmapT :: (forall b. Data b => b -> b) -> MutableByteArray s -> MutableByteArray s #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> MutableByteArray s -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> MutableByteArray s -> r #

gmapQ :: (forall d. Data d => d -> u) -> MutableByteArray s -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> MutableByteArray s -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> MutableByteArray s -> m (MutableByteArray s) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> MutableByteArray s -> m (MutableByteArray s) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> MutableByteArray s -> m (MutableByteArray s) #

(Typeable f, Data (f (Fix f))) => Data (Fix f) 
Instance details

Defined in Data.Fix

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Fix f -> c (Fix f) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Fix f) #

toConstr :: Fix f -> Constr #

dataTypeOf :: Fix f -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Fix f)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Fix f)) #

gmapT :: (forall b. Data b => b -> b) -> Fix f -> Fix f #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Fix f -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Fix f -> r #

gmapQ :: (forall d. Data d => d -> u) -> Fix f -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Fix f -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Fix f -> m (Fix f) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Fix f -> m (Fix f) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Fix f -> m (Fix f) #

Data a => Data (AddrRange a) 
Instance details

Defined in Data.IP.Range

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AddrRange a -> c (AddrRange a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (AddrRange a) #

toConstr :: AddrRange a -> Constr #

dataTypeOf :: AddrRange a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (AddrRange a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (AddrRange a)) #

gmapT :: (forall b. Data b => b -> b) -> AddrRange a -> AddrRange a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AddrRange a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AddrRange a -> r #

gmapQ :: (forall d. Data d => d -> u) -> AddrRange a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AddrRange a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AddrRange a -> m (AddrRange a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AddrRange a -> m (AddrRange a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AddrRange a -> m (AddrRange a) #

Data mono => Data (NonNull mono) 
Instance details

Defined in Data.NonNull

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NonNull mono -> c (NonNull mono) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (NonNull mono) #

toConstr :: NonNull mono -> Constr #

dataTypeOf :: NonNull mono -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (NonNull mono)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (NonNull mono)) #

gmapT :: (forall b. Data b => b -> b) -> NonNull mono -> NonNull mono #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NonNull mono -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NonNull mono -> r #

gmapQ :: (forall d. Data d => d -> u) -> NonNull mono -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> NonNull mono -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NonNull mono -> m (NonNull mono) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NonNull mono -> m (NonNull mono) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NonNull mono -> m (NonNull mono) #

Data a => Data (Array a) 
Instance details

Defined in Data.Primitive.Array

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Array a -> c (Array a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Array a) #

toConstr :: Array a -> Constr #

dataTypeOf :: Array a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Array a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Array a)) #

gmapT :: (forall b. Data b => b -> b) -> Array a -> Array a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Array a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Array a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Array a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Array a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Array a -> m (Array a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Array a -> m (Array a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Array a -> m (Array a) #

Data a => Data (SmallArray a) 
Instance details

Defined in Data.Primitive.SmallArray

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SmallArray a -> c (SmallArray a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (SmallArray a) #

toConstr :: SmallArray a -> Constr #

dataTypeOf :: SmallArray a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (SmallArray a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (SmallArray a)) #

gmapT :: (forall b. Data b => b -> b) -> SmallArray a -> SmallArray a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SmallArray a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SmallArray a -> r #

gmapQ :: (forall d. Data d => d -> u) -> SmallArray a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SmallArray a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SmallArray a -> m (SmallArray a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SmallArray a -> m (SmallArray a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SmallArray a -> m (SmallArray a) #

Data a => Data (Maybe a) 
Instance details

Defined in Data.Strict.Maybe

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Maybe a -> c (Maybe a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Maybe a) #

toConstr :: Maybe a -> Constr #

dataTypeOf :: Maybe a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe0 (c (Maybe a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe0 (c (Maybe a)) #

gmapT :: (forall b. Data b => b -> b) -> Maybe a -> Maybe a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Maybe a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Maybe a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Maybe a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Maybe a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Maybe a -> m (Maybe a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Maybe a -> m (Maybe a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Maybe a -> m (Maybe a) #

Data flag => Data (TyVarBndr flag) 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TyVarBndr flag -> c (TyVarBndr flag) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (TyVarBndr flag) #

toConstr :: TyVarBndr flag -> Constr #

dataTypeOf :: TyVarBndr flag -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (TyVarBndr flag)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (TyVarBndr flag)) #

gmapT :: (forall b. Data b => b -> b) -> TyVarBndr flag -> TyVarBndr flag #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TyVarBndr flag -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TyVarBndr flag -> r #

gmapQ :: (forall d. Data d => d -> u) -> TyVarBndr flag -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TyVarBndr flag -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TyVarBndr flag -> m (TyVarBndr flag) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TyVarBndr flag -> m (TyVarBndr flag) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TyVarBndr flag -> m (TyVarBndr flag) #

(Data a, Eq a, Hashable a) => Data (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> HashSet a -> c (HashSet a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (HashSet a) #

toConstr :: HashSet a -> Constr #

dataTypeOf :: HashSet a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (HashSet a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (HashSet a)) #

gmapT :: (forall b. Data b => b -> b) -> HashSet a -> HashSet a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HashSet a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HashSet a -> r #

gmapQ :: (forall d. Data d => d -> u) -> HashSet a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> HashSet a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> HashSet a -> m (HashSet a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HashSet a -> m (HashSet a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HashSet a -> m (HashSet a) #

Data a => Data (Vector a) 
Instance details

Defined in Data.Vector

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Vector a -> c (Vector a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Vector a) #

toConstr :: Vector a -> Constr #

dataTypeOf :: Vector a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Vector a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Vector a)) #

gmapT :: (forall b. Data b => b -> b) -> Vector a -> Vector a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Vector a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Vector a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Vector a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Vector a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Vector a -> m (Vector a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Vector a -> m (Vector a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Vector a -> m (Vector a) #

(Data a, Prim a) => Data (Vector a) 
Instance details

Defined in Data.Vector.Primitive

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Vector a -> c (Vector a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Vector a) #

toConstr :: Vector a -> Constr #

dataTypeOf :: Vector a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Vector a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Vector a)) #

gmapT :: (forall b. Data b => b -> b) -> Vector a -> Vector a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Vector a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Vector a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Vector a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Vector a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Vector a -> m (Vector a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Vector a -> m (Vector a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Vector a -> m (Vector a) #

(Data a, Storable a) => Data (Vector a) 
Instance details

Defined in Data.Vector.Storable

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Vector a -> c (Vector a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Vector a) #

toConstr :: Vector a -> Constr #

dataTypeOf :: Vector a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Vector a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Vector a)) #

gmapT :: (forall b. Data b => b -> b) -> Vector a -> Vector a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Vector a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Vector a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Vector a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Vector a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Vector a -> m (Vector a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Vector a -> m (Vector a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Vector a -> m (Vector a) #

(Data a, Unbox a) => Data (Vector a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Vector a -> c (Vector a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Vector a) #

toConstr :: Vector a -> Constr #

dataTypeOf :: Vector a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Vector a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Vector a)) #

gmapT :: (forall b. Data b => b -> b) -> Vector a -> Vector a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Vector a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Vector a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Vector a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Vector a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Vector a -> m (Vector a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Vector a -> m (Vector a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Vector a -> m (Vector a) #

Data a => Data (NonEmpty a)

Since: base-4.9.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NonEmpty a -> c (NonEmpty a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (NonEmpty a) #

toConstr :: NonEmpty a -> Constr #

dataTypeOf :: NonEmpty a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (NonEmpty a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (NonEmpty a)) #

gmapT :: (forall b. Data b => b -> b) -> NonEmpty a -> NonEmpty a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NonEmpty a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NonEmpty a -> r #

gmapQ :: (forall d. Data d => d -> u) -> NonEmpty a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> NonEmpty a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NonEmpty a -> m (NonEmpty a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NonEmpty a -> m (NonEmpty a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NonEmpty a -> m (NonEmpty a) #

Data a => Data (Maybe a)

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Maybe a -> c (Maybe a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Maybe a) #

toConstr :: Maybe a -> Constr #

dataTypeOf :: Maybe a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Maybe a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Maybe a)) #

gmapT :: (forall b. Data b => b -> b) -> Maybe a -> Maybe a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Maybe a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Maybe a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Maybe a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Maybe a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Maybe a -> m (Maybe a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Maybe a -> m (Maybe a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Maybe a -> m (Maybe a) #

Data a => Data (a)

Since: base-4.15

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> (a) -> c (a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (a) #

toConstr :: (a) -> Constr #

dataTypeOf :: (a) -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (a)) #

gmapT :: (forall b. Data b => b -> b) -> (a) -> (a) #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> (a) -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> (a) -> r #

gmapQ :: (forall d. Data d => d -> u) -> (a) -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> (a) -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> (a) -> m (a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> (a) -> m (a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> (a) -> m (a) #

Data a => Data [a]

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> [a] -> c [a] #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c [a] #

toConstr :: [a] -> Constr #

dataTypeOf :: [a] -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c [a]) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c [a]) #

gmapT :: (forall b. Data b => b -> b) -> [a] -> [a] #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> [a] -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> [a] -> r #

gmapQ :: (forall d. Data d => d -> u) -> [a] -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> [a] -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> [a] -> m [a] #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> [a] -> m [a] #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> [a] -> m [a] #

(Typeable m, Typeable a, Data (m a)) => Data (WrappedMonad m a)

Since: base-4.14.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> WrappedMonad m a -> c (WrappedMonad m a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (WrappedMonad m a) #

toConstr :: WrappedMonad m a -> Constr #

dataTypeOf :: WrappedMonad m a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (WrappedMonad m a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (WrappedMonad m a)) #

gmapT :: (forall b. Data b => b -> b) -> WrappedMonad m a -> WrappedMonad m a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WrappedMonad m a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WrappedMonad m a -> r #

gmapQ :: (forall d. Data d => d -> u) -> WrappedMonad m a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> WrappedMonad m a -> u #

gmapM :: Monad m0 => (forall d. Data d => d -> m0 d) -> WrappedMonad m a -> m0 (WrappedMonad m a) #

gmapMp :: MonadPlus m0 => (forall d. Data d => d -> m0 d) -> WrappedMonad m a -> m0 (WrappedMonad m a) #

gmapMo :: MonadPlus m0 => (forall d. Data d => d -> m0 d) -> WrappedMonad m a -> m0 (WrappedMonad m a) #

(Data a, Data b) => Data (Either a b)

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> Either a b -> c (Either a b) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Either a b) #

toConstr :: Either a b -> Constr #

dataTypeOf :: Either a b -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Either a b)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Either a b)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> Either a b -> Either a b #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Either a b -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Either a b -> r #

gmapQ :: (forall d. Data d => d -> u) -> Either a b -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Either a b -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Either a b -> m (Either a b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Either a b -> m (Either a b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Either a b -> m (Either a b) #

Data t => Data (Proxy t)

Since: base-4.7.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Proxy t -> c (Proxy t) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Proxy t) #

toConstr :: Proxy t -> Constr #

dataTypeOf :: Proxy t -> DataType #

dataCast1 :: Typeable t0 => (forall d. Data d => c (t0 d)) -> Maybe (c (Proxy t)) #

dataCast2 :: Typeable t0 => (forall d e. (Data d, Data e) => c (t0 d e)) -> Maybe (c (Proxy t)) #

gmapT :: (forall b. Data b => b -> b) -> Proxy t -> Proxy t #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Proxy t -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Proxy t -> r #

gmapQ :: (forall d. Data d => d -> u) -> Proxy t -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Proxy t -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Proxy t -> m (Proxy t) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Proxy t -> m (Proxy t) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Proxy t -> m (Proxy t) #

(Data a, Data b) => Data (Arg a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> Arg a b -> c (Arg a b) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Arg a b) #

toConstr :: Arg a b -> Constr #

dataTypeOf :: Arg a b -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Arg a b)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Arg a b)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> Arg a b -> Arg a b #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Arg a b -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Arg a b -> r #

gmapQ :: (forall d. Data d => d -> u) -> Arg a b -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Arg a b -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Arg a b -> m (Arg a b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Arg a b -> m (Arg a b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Arg a b -> m (Arg a b) #

(Data a, Data b, Ix a) => Data (Array a b)

Since: base-4.8.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> Array a b -> c (Array a b) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Array a b) #

toConstr :: Array a b -> Constr #

dataTypeOf :: Array a b -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Array a b)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Array a b)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> Array a b -> Array a b #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Array a b -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Array a b -> r #

gmapQ :: (forall d. Data d => d -> u) -> Array a b -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Array a b -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Array a b -> m (Array a b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Array a b -> m (Array a b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Array a b -> m (Array a b) #

Data p => Data (U1 p)

Since: base-4.9.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> U1 p -> c (U1 p) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (U1 p) #

toConstr :: U1 p -> Constr #

dataTypeOf :: U1 p -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (U1 p)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (U1 p)) #

gmapT :: (forall b. Data b => b -> b) -> U1 p -> U1 p #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> U1 p -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> U1 p -> r #

gmapQ :: (forall d. Data d => d -> u) -> U1 p -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> U1 p -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> U1 p -> m (U1 p) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> U1 p -> m (U1 p) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> U1 p -> m (U1 p) #

Data p => Data (V1 p)

Since: base-4.9.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> V1 p -> c (V1 p) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (V1 p) #

toConstr :: V1 p -> Constr #

dataTypeOf :: V1 p -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (V1 p)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (V1 p)) #

gmapT :: (forall b. Data b => b -> b) -> V1 p -> V1 p #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> V1 p -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> V1 p -> r #

gmapQ :: (forall d. Data d => d -> u) -> V1 p -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> V1 p -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> V1 p -> m (V1 p) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> V1 p -> m (V1 p) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> V1 p -> m (V1 p) #

(Data k, Data a, Ord k) => Data (Map k a) 
Instance details

Defined in Data.Map.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Map k a -> c (Map k a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Map k a) #

toConstr :: Map k a -> Constr #

dataTypeOf :: Map k a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Map k a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Map k a)) #

gmapT :: (forall b. Data b => b -> b) -> Map k a -> Map k a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Map k a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Map k a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Map k a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Map k a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Map k a -> m (Map k a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Map k a -> m (Map k a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Map k a -> m (Map k a) #

(Typeable f, Data (f (Cofree f a)), Data a) => Data (Cofree f a) 
Instance details

Defined in Control.Comonad.Cofree

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Cofree f a -> c (Cofree f a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Cofree f a) #

toConstr :: Cofree f a -> Constr #

dataTypeOf :: Cofree f a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Cofree f a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Cofree f a)) #

gmapT :: (forall b. Data b => b -> b) -> Cofree f a -> Cofree f a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Cofree f a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Cofree f a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Cofree f a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Cofree f a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Cofree f a -> m (Cofree f a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Cofree f a -> m (Cofree f a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Cofree f a -> m (Cofree f a) #

(Typeable f, Data (f (Free f a)), Data a) => Data (Free f a) 
Instance details

Defined in Control.Monad.Free

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Free f a -> c (Free f a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Free f a) #

toConstr :: Free f a -> Constr #

dataTypeOf :: Free f a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Free f a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Free f a)) #

gmapT :: (forall b. Data b => b -> b) -> Free f a -> Free f a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Free f a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Free f a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Free f a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Free f a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Free f a -> m (Free f a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Free f a -> m (Free f a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Free f a -> m (Free f a) #

(Typeable s, Typeable a) => Data (MutableArray s a) 
Instance details

Defined in Data.Primitive.Array

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> MutableArray s a -> c (MutableArray s a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (MutableArray s a) #

toConstr :: MutableArray s a -> Constr #

dataTypeOf :: MutableArray s a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (MutableArray s a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (MutableArray s a)) #

gmapT :: (forall b. Data b => b -> b) -> MutableArray s a -> MutableArray s a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> MutableArray s a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> MutableArray s a -> r #

gmapQ :: (forall d. Data d => d -> u) -> MutableArray s a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> MutableArray s a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> MutableArray s a -> m (MutableArray s a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> MutableArray s a -> m (MutableArray s a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> MutableArray s a -> m (MutableArray s a) #

(Typeable s, Typeable a) => Data (SmallMutableArray s a) 
Instance details

Defined in Data.Primitive.SmallArray

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SmallMutableArray s a -> c (SmallMutableArray s a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (SmallMutableArray s a) #

toConstr :: SmallMutableArray s a -> Constr #

dataTypeOf :: SmallMutableArray s a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (SmallMutableArray s a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (SmallMutableArray s a)) #

gmapT :: (forall b. Data b => b -> b) -> SmallMutableArray s a -> SmallMutableArray s a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SmallMutableArray s a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SmallMutableArray s a -> r #

gmapQ :: (forall d. Data d => d -> u) -> SmallMutableArray s a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SmallMutableArray s a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SmallMutableArray s a -> m (SmallMutableArray s a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SmallMutableArray s a -> m (SmallMutableArray s a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SmallMutableArray s a -> m (SmallMutableArray s a) #

(Data a, Data b) => Data (Either a b) 
Instance details

Defined in Data.Strict.Either

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> Either a b -> c (Either a b) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Either a b) #

toConstr :: Either a b -> Constr #

dataTypeOf :: Either a b -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Either a b)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Either a b)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> Either a b -> Either a b #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Either a b -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Either a b -> r #

gmapQ :: (forall d. Data d => d -> u) -> Either a b -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Either a b -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Either a b -> m (Either a b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Either a b -> m (Either a b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Either a b -> m (Either a b) #

(Data a, Data b) => Data (These a b) 
Instance details

Defined in Data.Strict.These

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> These a b -> c (These a b) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (These a b) #

toConstr :: These a b -> Constr #

dataTypeOf :: These a b -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (These a b)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (These a b)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> These a b -> These a b #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> These a b -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> These a b -> r #

gmapQ :: (forall d. Data d => d -> u) -> These a b -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> These a b -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> These a b -> m (These a b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> These a b -> m (These a b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> These a b -> m (These a b) #

(Data a, Data b) => Data (Pair a b) 
Instance details

Defined in Data.Strict.Tuple

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> Pair a b -> c (Pair a b) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Pair a b) #

toConstr :: Pair a b -> Constr #

dataTypeOf :: Pair a b -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Pair a b)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Pair a b)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> Pair a b -> Pair a b #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Pair a b -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Pair a b -> r #

gmapQ :: (forall d. Data d => d -> u) -> Pair a b -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Pair a b -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Pair a b -> m (Pair a b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Pair a b -> m (Pair a b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Pair a b -> m (Pair a b) #

(Data a, Data b) => Data (These a b) 
Instance details

Defined in Data.These

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> These a b -> c (These a b) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (These a b) #

toConstr :: These a b -> Constr #

dataTypeOf :: These a b -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (These a b)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (These a b)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> These a b -> These a b #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> These a b -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> These a b -> r #

gmapQ :: (forall d. Data d => d -> u) -> These a b -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> These a b -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> These a b -> m (These a b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> These a b -> m (These a b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> These a b -> m (These a b) #

(Data k, Data v, Eq k, Hashable k) => Data (HashMap k v) 
Instance details

Defined in Data.HashMap.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> HashMap k v -> c (HashMap k v) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (HashMap k v) #

toConstr :: HashMap k v -> Constr #

dataTypeOf :: HashMap k v -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (HashMap k v)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (HashMap k v)) #

gmapT :: (forall b. Data b => b -> b) -> HashMap k v -> HashMap k v #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HashMap k v -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HashMap k v -> r #

gmapQ :: (forall d. Data d => d -> u) -> HashMap k v -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> HashMap k v -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> HashMap k v -> m (HashMap k v) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HashMap k v -> m (HashMap k v) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HashMap k v -> m (HashMap k v) #

(Data a, Data b) => Data (a, b)

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> (a, b) -> c (a, b) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (a, b) #

toConstr :: (a, b) -> Constr #

dataTypeOf :: (a, b) -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (a, b)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (a, b)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> (a, b) -> (a, b) #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> (a, b) -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> (a, b) -> r #

gmapQ :: (forall d. Data d => d -> u) -> (a, b) -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> (a, b) -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> (a, b) -> m (a, b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> (a, b) -> m (a, b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> (a, b) -> m (a, b) #

(Typeable a, Typeable b, Typeable c, Data (a b c)) => Data (WrappedArrow a b c)

Since: base-4.14.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b0. Data d => c0 (d -> b0) -> d -> c0 b0) -> (forall g. g -> c0 g) -> WrappedArrow a b c -> c0 (WrappedArrow a b c) #

gunfold :: (forall b0 r. Data b0 => c0 (b0 -> r) -> c0 r) -> (forall r. r -> c0 r) -> Constr -> c0 (WrappedArrow a b c) #

toConstr :: WrappedArrow a b c -> Constr #

dataTypeOf :: WrappedArrow a b c -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c0 (t d)) -> Maybe (c0 (WrappedArrow a b c)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c0 (t d e)) -> Maybe (c0 (WrappedArrow a b c)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> WrappedArrow a b c -> WrappedArrow a b c #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WrappedArrow a b c -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WrappedArrow a b c -> r #

gmapQ :: (forall d. Data d => d -> u) -> WrappedArrow a b c -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> WrappedArrow a b c -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> WrappedArrow a b c -> m (WrappedArrow a b c) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> WrappedArrow a b c -> m (WrappedArrow a b c) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> WrappedArrow a b c -> m (WrappedArrow a b c) #

(Typeable k, Data a, Typeable b) => Data (Const a b)

Since: base-4.10.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> Const a b -> c (Const a b) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Const a b) #

toConstr :: Const a b -> Constr #

dataTypeOf :: Const a b -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Const a b)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Const a b)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> Const a b -> Const a b #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Const a b -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Const a b -> r #

gmapQ :: (forall d. Data d => d -> u) -> Const a b -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Const a b -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Const a b -> m (Const a b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Const a b -> m (Const a b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Const a b -> m (Const a b) #

(Data (f a), Data a, Typeable f) => Data (Ap f a)

Since: base-4.12.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Ap f a -> c (Ap f a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Ap f a) #

toConstr :: Ap f a -> Constr #

dataTypeOf :: Ap f a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Ap f a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Ap f a)) #

gmapT :: (forall b. Data b => b -> b) -> Ap f a -> Ap f a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Ap f a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Ap f a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Ap f a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Ap f a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Ap f a -> m (Ap f a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Ap f a -> m (Ap f a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Ap f a -> m (Ap f a) #

(Data (f a), Data a, Typeable f) => Data (Alt f a)

Since: base-4.8.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Alt f a -> c (Alt f a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Alt f a) #

toConstr :: Alt f a -> Constr #

dataTypeOf :: Alt f a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Alt f a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Alt f a)) #

gmapT :: (forall b. Data b => b -> b) -> Alt f a -> Alt f a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Alt f a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Alt f a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Alt f a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Alt f a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Alt f a -> m (Alt f a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Alt f a -> m (Alt f a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Alt f a -> m (Alt f a) #

(Coercible a b, Data a, Data b) => Data (Coercion a b)

Since: base-4.7.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> Coercion a b -> c (Coercion a b) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Coercion a b) #

toConstr :: Coercion a b -> Constr #

dataTypeOf :: Coercion a b -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Coercion a b)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Coercion a b)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> Coercion a b -> Coercion a b #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Coercion a b -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Coercion a b -> r #

gmapQ :: (forall d. Data d => d -> u) -> Coercion a b -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Coercion a b -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Coercion a b -> m (Coercion a b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Coercion a b -> m (Coercion a b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Coercion a b -> m (Coercion a b) #

(a ~ b, Data a) => Data (a :~: b)

Since: base-4.7.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> (a :~: b) -> c (a :~: b) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (a :~: b) #

toConstr :: (a :~: b) -> Constr #

dataTypeOf :: (a :~: b) -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (a :~: b)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (a :~: b)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> (a :~: b) -> a :~: b #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> (a :~: b) -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> (a :~: b) -> r #

gmapQ :: (forall d. Data d => d -> u) -> (a :~: b) -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> (a :~: b) -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> (a :~: b) -> m (a :~: b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> (a :~: b) -> m (a :~: b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> (a :~: b) -> m (a :~: b) #

(Data (f p), Typeable f, Data p) => Data (Rec1 f p)

Since: base-4.9.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Rec1 f p -> c (Rec1 f p) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Rec1 f p) #

toConstr :: Rec1 f p -> Constr #

dataTypeOf :: Rec1 f p -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Rec1 f p)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Rec1 f p)) #

gmapT :: (forall b. Data b => b -> b) -> Rec1 f p -> Rec1 f p #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Rec1 f p -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Rec1 f p -> r #

gmapQ :: (forall d. Data d => d -> u) -> Rec1 f p -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Rec1 f p -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Rec1 f p -> m (Rec1 f p) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Rec1 f p -> m (Rec1 f p) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Rec1 f p -> m (Rec1 f p) #

(Typeable f, Data a, Data (f b), Data b) => Data (CofreeF f a b) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> CofreeF f a b -> c (CofreeF f a b) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (CofreeF f a b) #

toConstr :: CofreeF f a b -> Constr #

dataTypeOf :: CofreeF f a b -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (CofreeF f a b)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (CofreeF f a b)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> CofreeF f a b -> CofreeF f a b #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CofreeF f a b -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CofreeF f a b -> r #

gmapQ :: (forall d. Data d => d -> u) -> CofreeF f a b -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CofreeF f a b -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CofreeF f a b -> m (CofreeF f a b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CofreeF f a b -> m (CofreeF f a b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CofreeF f a b -> m (CofreeF f a b) #

(Typeable f, Typeable w, Data (w (CofreeF f a (CofreeT f w a))), Data a) => Data (CofreeT f w a) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CofreeT f w a -> c (CofreeT f w a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (CofreeT f w a) #

toConstr :: CofreeT f w a -> Constr #

dataTypeOf :: CofreeT f w a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (CofreeT f w a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (CofreeT f w a)) #

gmapT :: (forall b. Data b => b -> b) -> CofreeT f w a -> CofreeT f w a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CofreeT f w a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CofreeT f w a -> r #

gmapQ :: (forall d. Data d => d -> u) -> CofreeT f w a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CofreeT f w a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CofreeT f w a -> m (CofreeT f w a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CofreeT f w a -> m (CofreeT f w a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CofreeT f w a -> m (CofreeT f w a) #

(Typeable f, Typeable b, Data a, Data (f b)) => Data (FreeF f a b) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> FreeF f a b -> c (FreeF f a b) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (FreeF f a b) #

toConstr :: FreeF f a b -> Constr #

dataTypeOf :: FreeF f a b -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (FreeF f a b)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (FreeF f a b)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> FreeF f a b -> FreeF f a b #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FreeF f a b -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FreeF f a b -> r #

gmapQ :: (forall d. Data d => d -> u) -> FreeF f a b -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FreeF f a b -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FreeF f a b -> m (FreeF f a b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FreeF f a b -> m (FreeF f a b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FreeF f a b -> m (FreeF f a b) #

(Data s, Data b) => Data (Tagged s b) 
Instance details

Defined in Data.Tagged

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> Tagged s b -> c (Tagged s b) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Tagged s b) #

toConstr :: Tagged s b -> Constr #

dataTypeOf :: Tagged s b -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Tagged s b)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Tagged s b)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> Tagged s b -> Tagged s b #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Tagged s b -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Tagged s b -> r #

gmapQ :: (forall d. Data d => d -> u) -> Tagged s b -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Tagged s b -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Tagged s b -> m (Tagged s b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Tagged s b -> m (Tagged s b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Tagged s b -> m (Tagged s b) #

(Typeable f, Typeable g, Typeable a, Data (f a), Data (g a)) => Data (These1 f g a) 
Instance details

Defined in Data.Functor.These

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g0. g0 -> c g0) -> These1 f g a -> c (These1 f g a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (These1 f g a) #

toConstr :: These1 f g a -> Constr #

dataTypeOf :: These1 f g a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (These1 f g a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (These1 f g a)) #

gmapT :: (forall b. Data b => b -> b) -> These1 f g a -> These1 f g a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> These1 f g a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> These1 f g a -> r #

gmapQ :: (forall d. Data d => d -> u) -> These1 f g a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> These1 f g a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> These1 f g a -> m (These1 f g a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> These1 f g a -> m (These1 f g a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> These1 f g a -> m (These1 f g a) #

(Data a, Data b, Data c) => Data (a, b, c)

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b0. Data d => c0 (d -> b0) -> d -> c0 b0) -> (forall g. g -> c0 g) -> (a, b, c) -> c0 (a, b, c) #

gunfold :: (forall b0 r. Data b0 => c0 (b0 -> r) -> c0 r) -> (forall r. r -> c0 r) -> Constr -> c0 (a, b, c) #

toConstr :: (a, b, c) -> Constr #

dataTypeOf :: (a, b, c) -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c0 (t d)) -> Maybe (c0 (a, b, c)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c0 (t d e)) -> Maybe (c0 (a, b, c)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> (a, b, c) -> (a, b, c) #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> (a, b, c) -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> (a, b, c) -> r #

gmapQ :: (forall d. Data d => d -> u) -> (a, b, c) -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> (a, b, c) -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> (a, b, c) -> m (a, b, c) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> (a, b, c) -> m (a, b, c) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> (a, b, c) -> m (a, b, c) #

(Typeable a, Typeable f, Typeable g, Typeable k, Data (f a), Data (g a)) => Data (Product f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g0. g0 -> c g0) -> Product f g a -> c (Product f g a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Product f g a) #

toConstr :: Product f g a -> Constr #

dataTypeOf :: Product f g a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Product f g a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Product f g a)) #

gmapT :: (forall b. Data b => b -> b) -> Product f g a -> Product f g a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Product f g a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Product f g a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Product f g a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Product f g a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Product f g a -> m (Product f g a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Product f g a -> m (Product f g a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Product f g a -> m (Product f g a) #

(Typeable a, Typeable f, Typeable g, Typeable k, Data (f a), Data (g a)) => Data (Sum f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g0. g0 -> c g0) -> Sum f g a -> c (Sum f g a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Sum f g a) #

toConstr :: Sum f g a -> Constr #

dataTypeOf :: Sum f g a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Sum f g a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Sum f g a)) #

gmapT :: (forall b. Data b => b -> b) -> Sum f g a -> Sum f g a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Sum f g a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Sum f g a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Sum f g a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Sum f g a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Sum f g a -> m (Sum f g a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Sum f g a -> m (Sum f g a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Sum f g a -> m (Sum f g a) #

(Typeable i, Typeable j, Typeable a, Typeable b, a ~~ b) => Data (a :~~: b)

Since: base-4.10.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> (a :~~: b) -> c (a :~~: b) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (a :~~: b) #

toConstr :: (a :~~: b) -> Constr #

dataTypeOf :: (a :~~: b) -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (a :~~: b)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (a :~~: b)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> (a :~~: b) -> a :~~: b #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> (a :~~: b) -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> (a :~~: b) -> r #

gmapQ :: (forall d. Data d => d -> u) -> (a :~~: b) -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> (a :~~: b) -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> (a :~~: b) -> m (a :~~: b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> (a :~~: b) -> m (a :~~: b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> (a :~~: b) -> m (a :~~: b) #

(Typeable f, Typeable g, Data p, Data (f p), Data (g p)) => Data ((f :*: g) p)

Since: base-4.9.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g0. g0 -> c g0) -> (f :*: g) p -> c ((f :*: g) p) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ((f :*: g) p) #

toConstr :: (f :*: g) p -> Constr #

dataTypeOf :: (f :*: g) p -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ((f :*: g) p)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ((f :*: g) p)) #

gmapT :: (forall b. Data b => b -> b) -> (f :*: g) p -> (f :*: g) p #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> (f :*: g) p -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> (f :*: g) p -> r #

gmapQ :: (forall d. Data d => d -> u) -> (f :*: g) p -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> (f :*: g) p -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> (f :*: g) p -> m ((f :*: g) p) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> (f :*: g) p -> m ((f :*: g) p) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> (f :*: g) p -> m ((f :*: g) p) #

(Typeable f, Typeable g, Data p, Data (f p), Data (g p)) => Data ((f :+: g) p)

Since: base-4.9.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g0. g0 -> c g0) -> (f :+: g) p -> c ((f :+: g) p) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ((f :+: g) p) #

toConstr :: (f :+: g) p -> Constr #

dataTypeOf :: (f :+: g) p -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ((f :+: g) p)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ((f :+: g) p)) #

gmapT :: (forall b. Data b => b -> b) -> (f :+: g) p -> (f :+: g) p #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> (f :+: g) p -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> (f :+: g) p -> r #

gmapQ :: (forall d. Data d => d -> u) -> (f :+: g) p -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> (f :+: g) p -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> (f :+: g) p -> m ((f :+: g) p) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> (f :+: g) p -> m ((f :+: g) p) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> (f :+: g) p -> m ((f :+: g) p) #

(Typeable i, Data p, Data c) => Data (K1 i c p)

Since: base-4.9.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c0 (d -> b) -> d -> c0 b) -> (forall g. g -> c0 g) -> K1 i c p -> c0 (K1 i c p) #

gunfold :: (forall b r. Data b => c0 (b -> r) -> c0 r) -> (forall r. r -> c0 r) -> Constr -> c0 (K1 i c p) #

toConstr :: K1 i c p -> Constr #

dataTypeOf :: K1 i c p -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c0 (t d)) -> Maybe (c0 (K1 i c p)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c0 (t d e)) -> Maybe (c0 (K1 i c p)) #

gmapT :: (forall b. Data b => b -> b) -> K1 i c p -> K1 i c p #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> K1 i c p -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> K1 i c p -> r #

gmapQ :: (forall d. Data d => d -> u) -> K1 i c p -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> K1 i c p -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> K1 i c p -> m (K1 i c p) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> K1 i c p -> m (K1 i c p) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> K1 i c p -> m (K1 i c p) #

(Data a, Data b, Data c, Data d) => Data (a, b, c, d)

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d0 b0. Data d0 => c0 (d0 -> b0) -> d0 -> c0 b0) -> (forall g. g -> c0 g) -> (a, b, c, d) -> c0 (a, b, c, d) #

gunfold :: (forall b0 r. Data b0 => c0 (b0 -> r) -> c0 r) -> (forall r. r -> c0 r) -> Constr -> c0 (a, b, c, d) #

toConstr :: (a, b, c, d) -> Constr #

dataTypeOf :: (a, b, c, d) -> DataType #

dataCast1 :: Typeable t => (forall d0. Data d0 => c0 (t d0)) -> Maybe (c0 (a, b, c, d)) #

dataCast2 :: Typeable t => (forall d0 e. (Data d0, Data e) => c0 (t d0 e)) -> Maybe (c0 (a, b, c, d)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> (a, b, c, d) -> (a, b, c, d) #

gmapQl :: (r -> r' -> r) -> r -> (forall d0. Data d0 => d0 -> r') -> (a, b, c, d) -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d0. Data d0 => d0 -> r') -> (a, b, c, d) -> r #

gmapQ :: (forall d0. Data d0 => d0 -> u) -> (a, b, c, d) -> [u] #

gmapQi :: Int -> (forall d0. Data d0 => d0 -> u) -> (a, b, c, d) -> u #

gmapM :: Monad m => (forall d0. Data d0 => d0 -> m d0) -> (a, b, c, d) -> m (a, b, c, d) #

gmapMp :: MonadPlus m => (forall d0. Data d0 => d0 -> m d0) -> (a, b, c, d) -> m (a, b, c, d) #

gmapMo :: MonadPlus m => (forall d0. Data d0 => d0 -> m d0) -> (a, b, c, d) -> m (a, b, c, d) #

(Typeable a, Typeable f, Typeable g, Typeable k1, Typeable k2, Data (f (g a))) => Data (Compose f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g0. g0 -> c g0) -> Compose f g a -> c (Compose f g a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Compose f g a) #

toConstr :: Compose f g a -> Constr #

dataTypeOf :: Compose f g a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Compose f g a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Compose f g a)) #

gmapT :: (forall b. Data b => b -> b) -> Compose f g a -> Compose f g a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Compose f g a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Compose f g a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Compose f g a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Compose f g a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Compose f g a -> m (Compose f g a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Compose f g a -> m (Compose f g a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Compose f g a -> m (Compose f g a) #

(Typeable f, Typeable g, Data p, Data (f (g p))) => Data ((f :.: g) p)

Since: base-4.9.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g0. g0 -> c g0) -> (f :.: g) p -> c ((f :.: g) p) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ((f :.: g) p) #

toConstr :: (f :.: g) p -> Constr #

dataTypeOf :: (f :.: g) p -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ((f :.: g) p)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ((f :.: g) p)) #

gmapT :: (forall b. Data b => b -> b) -> (f :.: g) p -> (f :.: g) p #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> (f :.: g) p -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> (f :.: g) p -> r #

gmapQ :: (forall d. Data d => d -> u) -> (f :.: g) p -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> (f :.: g) p -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> (f :.: g) p -> m ((f :.: g) p) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> (f :.: g) p -> m ((f :.: g) p) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> (f :.: g) p -> m ((f :.: g) p) #

(Data p, Data (f p), Typeable c, Typeable i, Typeable f) => Data (M1 i c f p)

Since: base-4.9.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c0 (d -> b) -> d -> c0 b) -> (forall g. g -> c0 g) -> M1 i c f p -> c0 (M1 i c f p) #

gunfold :: (forall b r. Data b => c0 (b -> r) -> c0 r) -> (forall r. r -> c0 r) -> Constr -> c0 (M1 i c f p) #

toConstr :: M1 i c f p -> Constr #

dataTypeOf :: M1 i c f p -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c0 (t d)) -> Maybe (c0 (M1 i c f p)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c0 (t d e)) -> Maybe (c0 (M1 i c f p)) #

gmapT :: (forall b. Data b => b -> b) -> M1 i c f p -> M1 i c f p #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> M1 i c f p -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> M1 i c f p -> r #

gmapQ :: (forall d. Data d => d -> u) -> M1 i c f p -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> M1 i c f p -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> M1 i c f p -> m (M1 i c f p) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> M1 i c f p -> m (M1 i c f p) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> M1 i c f p -> m (M1 i c f p) #

(Data a, Data b, Data c, Data d, Data e) => Data (a, b, c, d, e)

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d0 b0. Data d0 => c0 (d0 -> b0) -> d0 -> c0 b0) -> (forall g. g -> c0 g) -> (a, b, c, d, e) -> c0 (a, b, c, d, e) #

gunfold :: (forall b0 r. Data b0 => c0 (b0 -> r) -> c0 r) -> (forall r. r -> c0 r) -> Constr -> c0 (a, b, c, d, e) #

toConstr :: (a, b, c, d, e) -> Constr #

dataTypeOf :: (a, b, c, d, e) -> DataType #

dataCast1 :: Typeable t => (forall d0. Data d0 => c0 (t d0)) -> Maybe (c0 (a, b, c, d, e)) #

dataCast2 :: Typeable t => (forall d0 e0. (Data d0, Data e0) => c0 (t d0 e0)) -> Maybe (c0 (a, b, c, d, e)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> (a, b, c, d, e) -> (a, b, c, d, e) #

gmapQl :: (r -> r' -> r) -> r -> (forall d0. Data d0 => d0 -> r') -> (a, b, c, d, e) -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d0. Data d0 => d0 -> r') -> (a, b, c, d, e) -> r #

gmapQ :: (forall d0. Data d0 => d0 -> u) -> (a, b, c, d, e) -> [u] #

gmapQi :: Int -> (forall d0. Data d0 => d0 -> u) -> (a, b, c, d, e) -> u #

gmapM :: Monad m => (forall d0. Data d0 => d0 -> m d0) -> (a, b, c, d, e) -> m (a, b, c, d, e) #

gmapMp :: MonadPlus m => (forall d0. Data d0 => d0 -> m d0) -> (a, b, c, d, e) -> m (a, b, c, d, e) #

gmapMo :: MonadPlus m => (forall d0. Data d0 => d0 -> m d0) -> (a, b, c, d, e) -> m (a, b, c, d, e) #

(Data a, Data b, Data c, Data d, Data e, Data f) => Data (a, b, c, d, e, f)

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d0 b0. Data d0 => c0 (d0 -> b0) -> d0 -> c0 b0) -> (forall g. g -> c0 g) -> (a, b, c, d, e, f) -> c0 (a, b, c, d, e, f) #

gunfold :: (forall b0 r. Data b0 => c0 (b0 -> r) -> c0 r) -> (forall r. r -> c0 r) -> Constr -> c0 (a, b, c, d, e, f) #

toConstr :: (a, b, c, d, e, f) -> Constr #

dataTypeOf :: (a, b, c, d, e, f) -> DataType #

dataCast1 :: Typeable t => (forall d0. Data d0 => c0 (t d0)) -> Maybe (c0 (a, b, c, d, e, f)) #

dataCast2 :: Typeable t => (forall d0 e0. (Data d0, Data e0) => c0 (t d0 e0)) -> Maybe (c0 (a, b, c, d, e, f)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> (a, b, c, d, e, f) -> (a, b, c, d, e, f) #

gmapQl :: (r -> r' -> r) -> r -> (forall d0. Data d0 => d0 -> r') -> (a, b, c, d, e, f) -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d0. Data d0 => d0 -> r') -> (a, b, c, d, e, f) -> r #

gmapQ :: (forall d0. Data d0 => d0 -> u) -> (a, b, c, d, e, f) -> [u] #

gmapQi :: Int -> (forall d0. Data d0 => d0 -> u) -> (a, b, c, d, e, f) -> u #

gmapM :: Monad m => (forall d0. Data d0 => d0 -> m d0) -> (a, b, c, d, e, f) -> m (a, b, c, d, e, f) #

gmapMp :: MonadPlus m => (forall d0. Data d0 => d0 -> m d0) -> (a, b, c, d, e, f) -> m (a, b, c, d, e, f) #

gmapMo :: MonadPlus m => (forall d0. Data d0 => d0 -> m d0) -> (a, b, c, d, e, f) -> m (a, b, c, d, e, f) #

(Data a, Data b, Data c, Data d, Data e, Data f, Data g) => Data (a, b, c, d, e, f, g)

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d0 b0. Data d0 => c0 (d0 -> b0) -> d0 -> c0 b0) -> (forall g0. g0 -> c0 g0) -> (a, b, c, d, e, f, g) -> c0 (a, b, c, d, e, f, g) #

gunfold :: (forall b0 r. Data b0 => c0 (b0 -> r) -> c0 r) -> (forall r. r -> c0 r) -> Constr -> c0 (a, b, c, d, e, f, g) #

toConstr :: (a, b, c, d, e, f, g) -> Constr #

dataTypeOf :: (a, b, c, d, e, f, g) -> DataType #

dataCast1 :: Typeable t => (forall d0. Data d0 => c0 (t d0)) -> Maybe (c0 (a, b, c, d, e, f, g)) #

dataCast2 :: Typeable t => (forall d0 e0. (Data d0, Data e0) => c0 (t d0 e0)) -> Maybe (c0 (a, b, c, d, e, f, g)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) #

gmapQl :: (r -> r' -> r) -> r -> (forall d0. Data d0 => d0 -> r') -> (a, b, c, d, e, f, g) -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d0. Data d0 => d0 -> r') -> (a, b, c, d, e, f, g) -> r #

gmapQ :: (forall d0. Data d0 => d0 -> u) -> (a, b, c, d, e, f, g) -> [u] #

gmapQi :: Int -> (forall d0. Data d0 => d0 -> u) -> (a, b, c, d, e, f, g) -> u #

gmapM :: Monad m => (forall d0. Data d0 => d0 -> m d0) -> (a, b, c, d, e, f, g) -> m (a, b, c, d, e, f, g) #

gmapMp :: MonadPlus m => (forall d0. Data d0 => d0 -> m d0) -> (a, b, c, d, e, f, g) -> m (a, b, c, d, e, f, g) #

gmapMo :: MonadPlus m => (forall d0. Data d0 => d0 -> m d0) -> (a, b, c, d, e, f, g) -> m (a, b, c, d, e, f, g) #

class Functor (f :: Type -> Type) where #

A type f is a Functor if it provides a function fmap which, given any types a and b lets you apply any function from (a -> b) to turn an f a into an f b, preserving the structure of f. Furthermore f needs to adhere to the following:

Identity
fmap id == id
Composition
fmap (f . g) == fmap f . fmap g

Note, that the second law follows from the free theorem of the type fmap and the first law, so you need only check that the former condition holds.

Minimal complete definition

fmap

Methods

fmap :: (a -> b) -> f a -> f b #

fmap is used to apply a function of type (a -> b) to a value of type f a, where f is a functor, to produce a value of type f b. Note that for any type constructor with more than one parameter (e.g., Either), only the last type parameter can be modified with fmap (e.g., b in `Either a b`).

Some type constructors with two parameters or more have a Bifunctor instance that allows both the last and the penultimate parameters to be mapped over.

Examples

Expand

Convert from a Maybe Int to a Maybe String using show:

>>> fmap show Nothing
Nothing
>>> fmap show (Just 3)
Just "3"

Convert from an Either Int Int to an Either Int String using show:

>>> fmap show (Left 17)
Left 17
>>> fmap show (Right 17)
Right "17"

Double each element of a list:

>>> fmap (*2) [1,2,3]
[2,4,6]

Apply even to the second element of a pair:

>>> fmap even (2,2)
(2,True)

It may seem surprising that the function is only applied to the last element of the tuple compared to the list example above which applies it to every element in the list. To understand, remember that tuples are type constructors with multiple type parameters: a tuple of 3 elements (a,b,c) can also be written (,,) a b c and its Functor instance is defined for Functor ((,,) a b) (i.e., only the third parameter is free to be mapped over with fmap).

It explains why fmap can be used with tuples containing values of different types as in the following example:

>>> fmap even ("hello", 1.0, 4)
("hello",1.0,True)

(<$) :: a -> f b -> f a infixl 4 #

Replace all locations in the input with the same value. The default definition is fmap . const, but this may be overridden with a more efficient version.

Instances

Instances details
Functor Gen 
Instance details

Defined in Test.QuickCheck.Gen

Methods

fmap :: (a -> b) -> Gen a -> Gen b #

(<$) :: a -> Gen b -> Gen a #

Functor Blind 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> Blind a -> Blind b #

(<$) :: a -> Blind b -> Blind a #

Functor Fixed 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> Fixed a -> Fixed b #

(<$) :: a -> Fixed b -> Fixed a #

Functor Large 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> Large a -> Large b #

(<$) :: a -> Large b -> Large a #

Functor Negative 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> Negative a -> Negative b #

(<$) :: a -> Negative b -> Negative a #

Functor NonEmptyList 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> NonEmptyList a -> NonEmptyList b #

(<$) :: a -> NonEmptyList b -> NonEmptyList a #

Functor NonNegative 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> NonNegative a -> NonNegative b #

(<$) :: a -> NonNegative b -> NonNegative a #

Functor NonPositive 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> NonPositive a -> NonPositive b #

(<$) :: a -> NonPositive b -> NonPositive a #

Functor NonZero 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> NonZero a -> NonZero b #

(<$) :: a -> NonZero b -> NonZero a #

Functor OrderedList 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> OrderedList a -> OrderedList b #

(<$) :: a -> OrderedList b -> OrderedList a #

Functor Positive 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> Positive a -> Positive b #

(<$) :: a -> Positive b -> Positive a #

Functor Shrink2 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> Shrink2 a -> Shrink2 b #

(<$) :: a -> Shrink2 b -> Shrink2 a #

Functor Small 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> Small a -> Small b #

(<$) :: a -> Small b -> Small a #

Functor Smart 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> Smart a -> Smart b #

(<$) :: a -> Smart b -> Smart a #

Functor SortedList 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> SortedList a -> SortedList b #

(<$) :: a -> SortedList b -> SortedList a #

Functor Rose 
Instance details

Defined in Test.QuickCheck.Property

Methods

fmap :: (a -> b) -> Rose a -> Rose b #

(<$) :: a -> Rose b -> Rose a #

Functor KeyMap 
Instance details

Defined in Data.Aeson.KeyMap

Methods

fmap :: (a -> b) -> KeyMap a -> KeyMap b #

(<$) :: a -> KeyMap b -> KeyMap a #

Functor FromJSONKeyFunction

Only law abiding up to interpretation

Instance details

Defined in Data.Aeson.Types.FromJSON

Functor IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fmap :: (a -> b) -> IResult a -> IResult b #

(<$) :: a -> IResult b -> IResult a #

Functor Parser 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fmap :: (a -> b) -> Parser a -> Parser b #

(<$) :: a -> Parser b -> Parser a #

Functor Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fmap :: (a -> b) -> Result a -> Result b #

(<$) :: a -> Result b -> Result a #

Functor Sensitive 
Instance details

Defined in Amazonka.Data.Sensitive

Methods

fmap :: (a -> b) -> Sensitive a -> Sensitive b #

(<$) :: a -> Sensitive b -> Sensitive a #

Functor Async 
Instance details

Defined in Control.Concurrent.Async

Methods

fmap :: (a -> b) -> Async a -> Async b #

(<$) :: a -> Async b -> Async a #

Functor Concurrently 
Instance details

Defined in Control.Concurrent.Async

Methods

fmap :: (a -> b) -> Concurrently a -> Concurrently b #

(<$) :: a -> Concurrently b -> Concurrently a #

Functor ZipList

Since: base-2.1

Instance details

Defined in Control.Applicative

Methods

fmap :: (a -> b) -> ZipList a -> ZipList b #

(<$) :: a -> ZipList b -> ZipList a #

Functor Handler

Since: base-4.6.0.0

Instance details

Defined in Control.Exception

Methods

fmap :: (a -> b) -> Handler a -> Handler b #

(<$) :: a -> Handler b -> Handler a #

Functor Complex

Since: base-4.9.0.0

Instance details

Defined in Data.Complex

Methods

fmap :: (a -> b) -> Complex a -> Complex b #

(<$) :: a -> Complex b -> Complex a #

Functor Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

fmap :: (a -> b) -> Identity a -> Identity b #

(<$) :: a -> Identity b -> Identity a #

Functor First

Since: base-4.8.0.0

Instance details

Defined in Data.Monoid

Methods

fmap :: (a -> b) -> First a -> First b #

(<$) :: a -> First b -> First a #

Functor Last

Since: base-4.8.0.0

Instance details

Defined in Data.Monoid

Methods

fmap :: (a -> b) -> Last a -> Last b #

(<$) :: a -> Last b -> Last a #

Functor Down

Since: base-4.11.0.0

Instance details

Defined in Data.Ord

Methods

fmap :: (a -> b) -> Down a -> Down b #

(<$) :: a -> Down b -> Down a #

Functor First

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

fmap :: (a -> b) -> First a -> First b #

(<$) :: a -> First b -> First a #

Functor Last

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

fmap :: (a -> b) -> Last a -> Last b #

(<$) :: a -> Last b -> Last a #

Functor Max

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

fmap :: (a -> b) -> Max a -> Max b #

(<$) :: a -> Max b -> Max a #

Functor Min

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

fmap :: (a -> b) -> Min a -> Min b #

(<$) :: a -> Min b -> Min a #

Functor Dual

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

fmap :: (a -> b) -> Dual a -> Dual b #

(<$) :: a -> Dual b -> Dual a #

Functor Product

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

fmap :: (a -> b) -> Product a -> Product b #

(<$) :: a -> Product b -> Product a #

Functor Sum

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

fmap :: (a -> b) -> Sum a -> Sum b #

(<$) :: a -> Sum b -> Sum a #

Functor STM

Since: base-4.3.0.0

Instance details

Defined in GHC.Conc.Sync

Methods

fmap :: (a -> b) -> STM a -> STM b #

(<$) :: a -> STM b -> STM a #

Functor Par1

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> Par1 a -> Par1 b #

(<$) :: a -> Par1 b -> Par1 a #

Functor P

Since: base-4.8.0.0

Instance details

Defined in Text.ParserCombinators.ReadP

Methods

fmap :: (a -> b) -> P a -> P b #

(<$) :: a -> P b -> P a #

Functor ReadP

Since: base-2.1

Instance details

Defined in Text.ParserCombinators.ReadP

Methods

fmap :: (a -> b) -> ReadP a -> ReadP b #

(<$) :: a -> ReadP b -> ReadP a #

Functor Put 
Instance details

Defined in Data.ByteString.Builder.Internal

Methods

fmap :: (a -> b) -> Put a -> Put b #

(<$) :: a -> Put b -> Put a #

Functor Flush 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

fmap :: (a -> b) -> Flush a -> Flush b #

(<$) :: a -> Flush b -> Flush a #

Functor SCC

Since: containers-0.5.4

Instance details

Defined in Data.Graph

Methods

fmap :: (a -> b) -> SCC a -> SCC b #

(<$) :: a -> SCC b -> SCC a #

Functor IntMap 
Instance details

Defined in Data.IntMap.Internal

Methods

fmap :: (a -> b) -> IntMap a -> IntMap b #

(<$) :: a -> IntMap b -> IntMap a #

Functor Digit 
Instance details

Defined in Data.Sequence.Internal

Methods

fmap :: (a -> b) -> Digit a -> Digit b #

(<$) :: a -> Digit b -> Digit a #

Functor Elem 
Instance details

Defined in Data.Sequence.Internal

Methods

fmap :: (a -> b) -> Elem a -> Elem b #

(<$) :: a -> Elem b -> Elem a #

Functor FingerTree 
Instance details

Defined in Data.Sequence.Internal

Methods

fmap :: (a -> b) -> FingerTree a -> FingerTree b #

(<$) :: a -> FingerTree b -> FingerTree a #

Functor Node 
Instance details

Defined in Data.Sequence.Internal

Methods

fmap :: (a -> b) -> Node a -> Node b #

(<$) :: a -> Node b -> Node a #

Functor Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

fmap :: (a -> b) -> Seq a -> Seq b #

(<$) :: a -> Seq b -> Seq a #

Functor ViewL 
Instance details

Defined in Data.Sequence.Internal

Methods

fmap :: (a -> b) -> ViewL a -> ViewL b #

(<$) :: a -> ViewL b -> ViewL a #

Functor ViewR 
Instance details

Defined in Data.Sequence.Internal

Methods

fmap :: (a -> b) -> ViewR a -> ViewR b #

(<$) :: a -> ViewR b -> ViewR a #

Functor Tree 
Instance details

Defined in Data.Tree

Methods

fmap :: (a -> b) -> Tree a -> Tree b #

(<$) :: a -> Tree b -> Tree a #

Functor View 
Instance details

Defined in Context.Internal

Methods

fmap :: (a -> b) -> View a -> View b #

(<$) :: a -> View b -> View a #

Functor CryptoFailable 
Instance details

Defined in Crypto.Error.Types

Methods

fmap :: (a -> b) -> CryptoFailable a -> CryptoFailable b #

(<$) :: a -> CryptoFailable b -> CryptoFailable a #

Functor DNonEmpty 
Instance details

Defined in Data.DList.DNonEmpty.Internal

Methods

fmap :: (a -> b) -> DNonEmpty a -> DNonEmpty b #

(<$) :: a -> DNonEmpty b -> DNonEmpty a #

Functor DList 
Instance details

Defined in Data.DList.Internal

Methods

fmap :: (a -> b) -> DList a -> DList b #

(<$) :: a -> DList b -> DList a #

Functor IO

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

fmap :: (a -> b) -> IO a -> IO b #

(<$) :: a -> IO b -> IO a #

Functor HistoriedResponse 
Instance details

Defined in Network.HTTP.Client

Functor Response 
Instance details

Defined in Network.HTTP.Client.Types

Methods

fmap :: (a -> b) -> Response a -> Response b #

(<$) :: a -> Response b -> Response a #

Functor CReader 
Instance details

Defined in Options.Applicative.Types

Methods

fmap :: (a -> b) -> CReader a -> CReader b #

(<$) :: a -> CReader b -> CReader a #

Functor OptReader 
Instance details

Defined in Options.Applicative.Types

Methods

fmap :: (a -> b) -> OptReader a -> OptReader b #

(<$) :: a -> OptReader b -> OptReader a #

Functor Option 
Instance details

Defined in Options.Applicative.Types

Methods

fmap :: (a -> b) -> Option a -> Option b #

(<$) :: a -> Option b -> Option a #

Functor Parser 
Instance details

Defined in Options.Applicative.Types

Methods

fmap :: (a -> b) -> Parser a -> Parser b #

(<$) :: a -> Parser b -> Parser a #

Functor ParserFailure 
Instance details

Defined in Options.Applicative.Types

Methods

fmap :: (a -> b) -> ParserFailure a -> ParserFailure b #

(<$) :: a -> ParserFailure b -> ParserFailure a #

Functor ParserInfo 
Instance details

Defined in Options.Applicative.Types

Methods

fmap :: (a -> b) -> ParserInfo a -> ParserInfo b #

(<$) :: a -> ParserInfo b -> ParserInfo a #

Functor ParserM 
Instance details

Defined in Options.Applicative.Types

Methods

fmap :: (a -> b) -> ParserM a -> ParserM b #

(<$) :: a -> ParserM b -> ParserM a #

Functor ParserResult 
Instance details

Defined in Options.Applicative.Types

Methods

fmap :: (a -> b) -> ParserResult a -> ParserResult b #

(<$) :: a -> ParserResult b -> ParserResult a #

Functor ReadM 
Instance details

Defined in Options.Applicative.Types

Methods

fmap :: (a -> b) -> ReadM a -> ReadM b #

(<$) :: a -> ReadM b -> ReadM a #

Functor AnnotDetails 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

fmap :: (a -> b) -> AnnotDetails a -> AnnotDetails b #

(<$) :: a -> AnnotDetails b -> AnnotDetails a #

Functor Doc 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

fmap :: (a -> b) -> Doc a -> Doc b #

(<$) :: a -> Doc b -> Doc a #

Functor Span 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

fmap :: (a -> b) -> Span a -> Span b #

(<$) :: a -> Span b -> Span a #

Functor Doc

Alter the document’s annotations.

This instance makes Doc more flexible (because it can be used in Functor-polymorphic values), but fmap is much less readable compared to using reAnnotate in code that only works for Doc anyway. Consider using the latter when the type does not matter.

Instance details

Defined in Prettyprinter.Internal

Methods

fmap :: (a -> b) -> Doc a -> Doc b #

(<$) :: a -> Doc b -> Doc a #

Functor FlattenResult 
Instance details

Defined in Prettyprinter.Internal

Methods

fmap :: (a -> b) -> FlattenResult a -> FlattenResult b #

(<$) :: a -> FlattenResult b -> FlattenResult a #

Functor SimpleDocStream

Alter the document’s annotations.

This instance makes SimpleDocStream more flexible (because it can be used in Functor-polymorphic values), but fmap is much less readable compared to using reAnnotateST in code that only works for SimpleDocStream anyway. Consider using the latter when the type does not matter.

Instance details

Defined in Prettyprinter.Internal

Methods

fmap :: (a -> b) -> SimpleDocStream a -> SimpleDocStream b #

(<$) :: a -> SimpleDocStream b -> SimpleDocStream a #

Functor Array 
Instance details

Defined in Data.Primitive.Array

Methods

fmap :: (a -> b) -> Array a -> Array b #

(<$) :: a -> Array b -> Array a #

Functor SmallArray 
Instance details

Defined in Data.Primitive.SmallArray

Methods

fmap :: (a -> b) -> SmallArray a -> SmallArray b #

(<$) :: a -> SmallArray b -> SmallArray a #

Functor Acquire 
Instance details

Defined in Data.Acquire.Internal

Methods

fmap :: (a -> b) -> Acquire a -> Acquire b #

(<$) :: a -> Acquire b -> Acquire a #

Functor Maybe 
Instance details

Defined in Data.Strict.Maybe

Methods

fmap :: (a -> b) -> Maybe a -> Maybe b #

(<$) :: a -> Maybe b -> Maybe a #

Functor Q 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

fmap :: (a -> b) -> Q a -> Q b #

(<$) :: a -> Q b -> Q a #

Functor TyVarBndr 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

fmap :: (a -> b) -> TyVarBndr a -> TyVarBndr b #

(<$) :: a -> TyVarBndr b -> TyVarBndr a #

Functor Cleanup 
Instance details

Defined in System.Process.Typed.Internal

Methods

fmap :: (a -> b) -> Cleanup a -> Cleanup b #

(<$) :: a -> Cleanup b -> Cleanup a #

Functor Flat 
Instance details

Defined in UnliftIO.Internals.Async

Methods

fmap :: (a -> b) -> Flat a -> Flat b #

(<$) :: a -> Flat b -> Flat a #

Functor FlatApp 
Instance details

Defined in UnliftIO.Internals.Async

Methods

fmap :: (a -> b) -> FlatApp a -> FlatApp b #

(<$) :: a -> FlatApp b -> FlatApp a #

Functor Memoized 
Instance details

Defined in UnliftIO.Memoize

Methods

fmap :: (a -> b) -> Memoized a -> Memoized b #

(<$) :: a -> Memoized b -> Memoized a #

Functor Vector 
Instance details

Defined in Data.Vector

Methods

fmap :: (a -> b) -> Vector a -> Vector b #

(<$) :: a -> Vector b -> Vector a #

Functor Id 
Instance details

Defined in Data.Vector.Fusion.Util

Methods

fmap :: (a -> b) -> Id a -> Id b #

(<$) :: a -> Id b -> Id a #

Functor Stream 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

fmap :: (a -> b) -> Stream a -> Stream b #

(<$) :: a -> Stream b -> Stream a #

Functor NonEmpty

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

fmap :: (a -> b) -> NonEmpty a -> NonEmpty b #

(<$) :: a -> NonEmpty b -> NonEmpty a #

Functor Maybe

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

fmap :: (a -> b) -> Maybe a -> Maybe b #

(<$) :: a -> Maybe b -> Maybe a #

Functor Solo

Since: base-4.15

Instance details

Defined in GHC.Base

Methods

fmap :: (a -> b) -> Solo a -> Solo b #

(<$) :: a -> Solo b -> Solo a #

Functor []

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

fmap :: (a -> b) -> [a] -> [b] #

(<$) :: a -> [b] -> [a] #

Functor ((:->) a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

fmap :: (a0 -> b) -> (a :-> a0) -> a :-> b #

(<$) :: a0 -> (a :-> b) -> a :-> a0 #

Functor (Fun a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

fmap :: (a0 -> b) -> Fun a a0 -> Fun a b #

(<$) :: a0 -> Fun a b -> Fun a a0 #

Functor (Shrinking s) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> Shrinking s a -> Shrinking s b #

(<$) :: a -> Shrinking s b -> Shrinking s a #

Functor f => Functor (Co f) 
Instance details

Defined in Data.Functor.Rep

Methods

fmap :: (a -> b) -> Co f a -> Co f b #

(<$) :: a -> Co f b -> Co f a #

Functor (Tagged2 s) 
Instance details

Defined in Data.Aeson.Types.Generic

Methods

fmap :: (a -> b) -> Tagged2 s a -> Tagged2 s b #

(<$) :: a -> Tagged2 s b -> Tagged2 s a #

Functor (IResult i) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

fmap :: (a -> b) -> IResult i a -> IResult i b #

(<$) :: a -> IResult i b -> IResult i a #

Functor (Parser i) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

fmap :: (a -> b) -> Parser i a -> Parser i b #

(<$) :: a -> Parser i b -> Parser i a #

Monad m => Functor (WrappedMonad m)

Since: base-2.1

Instance details

Defined in Control.Applicative

Methods

fmap :: (a -> b) -> WrappedMonad m a -> WrappedMonad m b #

(<$) :: a -> WrappedMonad m b -> WrappedMonad m a #

Arrow a => Functor (ArrowMonad a)

Since: base-4.6.0.0

Instance details

Defined in Control.Arrow

Methods

fmap :: (a0 -> b) -> ArrowMonad a a0 -> ArrowMonad a b #

(<$) :: a0 -> ArrowMonad a b -> ArrowMonad a a0 #

Functor (Either a)

Since: base-3.0

Instance details

Defined in Data.Either

Methods

fmap :: (a0 -> b) -> Either a a0 -> Either a b #

(<$) :: a0 -> Either a b -> Either a a0 #

Functor (StateL s)

Since: base-4.0

Instance details

Defined in Data.Functor.Utils

Methods

fmap :: (a -> b) -> StateL s a -> StateL s b #

(<$) :: a -> StateL s b -> StateL s a #

Functor (StateR s)

Since: base-4.0

Instance details

Defined in Data.Functor.Utils

Methods

fmap :: (a -> b) -> StateR s a -> StateR s b #

(<$) :: a -> StateR s b -> StateR s a #

Functor (Proxy :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

fmap :: (a -> b) -> Proxy a -> Proxy b #

(<$) :: a -> Proxy b -> Proxy a #

Functor (Arg a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

fmap :: (a0 -> b) -> Arg a a0 -> Arg a b #

(<$) :: a0 -> Arg a b -> Arg a a0 #

Functor (Array i)

Since: base-2.1

Instance details

Defined in GHC.Arr

Methods

fmap :: (a -> b) -> Array i a -> Array i b #

(<$) :: a -> Array i b -> Array i a #

Functor (U1 :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> U1 a -> U1 b #

(<$) :: a -> U1 b -> U1 a #

Functor (V1 :: TYPE LiftedRep -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> V1 a -> V1 b #

(<$) :: a -> V1 b -> V1 a #

Functor (ST s)

Since: base-2.1

Instance details

Defined in GHC.ST

Methods

fmap :: (a -> b) -> ST s a -> ST s b #

(<$) :: a -> ST s b -> ST s a #

Monad m => Functor (ZipSource m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

fmap :: (a -> b) -> ZipSource m a -> ZipSource m b #

(<$) :: a -> ZipSource m b -> ZipSource m a #

Functor (SetM s) 
Instance details

Defined in Data.Graph

Methods

fmap :: (a -> b) -> SetM s a -> SetM s b #

(<$) :: a -> SetM s b -> SetM s a #

Functor (Map k) 
Instance details

Defined in Data.Map.Internal

Methods

fmap :: (a -> b) -> Map k a -> Map k b #

(<$) :: a -> Map k b -> Map k a #

Functor (Parser e) 
Instance details

Defined in Env.Internal.Parser

Methods

fmap :: (a -> b) -> Parser e a -> Parser e b #

(<$) :: a -> Parser e b -> Parser e a #

Functor (VarF e) 
Instance details

Defined in Env.Internal.Parser

Methods

fmap :: (a -> b) -> VarF e a -> VarF e b #

(<$) :: a -> VarF e b -> VarF e a #

Monad m => Functor (Handler m) 
Instance details

Defined in Control.Monad.Catch

Methods

fmap :: (a -> b) -> Handler m a -> Handler m b #

(<$) :: a -> Handler m b -> Handler m a #

Functor f => Functor (Cofree f) 
Instance details

Defined in Control.Comonad.Cofree

Methods

fmap :: (a -> b) -> Cofree f a -> Cofree f b #

(<$) :: a -> Cofree f b -> Cofree f a #

Functor f => Functor (Free f) 
Instance details

Defined in Control.Monad.Free

Methods

fmap :: (a -> b) -> Free f a -> Free f b #

(<$) :: a -> Free f b -> Free f a #

Functor (Yoneda f) 
Instance details

Defined in Data.Functor.Yoneda

Methods

fmap :: (a -> b) -> Yoneda f a -> Yoneda f b #

(<$) :: a -> Yoneda f b -> Yoneda f a #

Functor f => Functor (Indexing f) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

fmap :: (a -> b) -> Indexing f a -> Indexing f b #

(<$) :: a -> Indexing f b -> Indexing f a #

Functor f => Functor (Indexing64 f) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

fmap :: (a -> b) -> Indexing64 f a -> Indexing64 f b #

(<$) :: a -> Indexing64 f b -> Indexing64 f a #

Functor (ReifiedFold s) 
Instance details

Defined in Control.Lens.Reified

Methods

fmap :: (a -> b) -> ReifiedFold s a -> ReifiedFold s b #

(<$) :: a -> ReifiedFold s b -> ReifiedFold s a #

Functor (ReifiedGetter s) 
Instance details

Defined in Control.Lens.Reified

Methods

fmap :: (a -> b) -> ReifiedGetter s a -> ReifiedGetter s b #

(<$) :: a -> ReifiedGetter s b -> ReifiedGetter s a #

Functor m => Functor (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

fmap :: (a -> b) -> LoggingT m a -> LoggingT m b #

(<$) :: a -> LoggingT m b -> LoggingT m a #

Functor m => Functor (NoLoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

fmap :: (a -> b) -> NoLoggingT m a -> NoLoggingT m b #

(<$) :: a -> NoLoggingT m b -> NoLoggingT m a #

Functor m => Functor (WriterLoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

fmap :: (a -> b) -> WriterLoggingT m a -> WriterLoggingT m b #

(<$) :: a -> WriterLoggingT m b -> WriterLoggingT m a #

Functor f => Functor (WrappedPoly f) 
Instance details

Defined in Data.MonoTraversable

Methods

fmap :: (a -> b) -> WrappedPoly f a -> WrappedPoly f b #

(<$) :: a -> WrappedPoly f b -> WrappedPoly f a #

Functor m => Functor (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

fmap :: (a -> b) -> ResourceT m a -> ResourceT m b #

(<$) :: a -> ResourceT m b -> ResourceT m a #

Functor (RIO env) 
Instance details

Defined in RIO.Prelude.RIO

Methods

fmap :: (a -> b) -> RIO env a -> RIO env b #

(<$) :: a -> RIO env b -> RIO env a #

Functor (Either a) 
Instance details

Defined in Data.Strict.Either

Methods

fmap :: (a0 -> b) -> Either a a0 -> Either a b #

(<$) :: a0 -> Either a b -> Either a a0 #

Functor (These a) 
Instance details

Defined in Data.Strict.These

Methods

fmap :: (a0 -> b) -> These a a0 -> These a b #

(<$) :: a0 -> These a b -> These a a0 #

Functor (Pair e) 
Instance details

Defined in Data.Strict.Tuple

Methods

fmap :: (a -> b) -> Pair e a -> Pair e b #

(<$) :: a -> Pair e b -> Pair e a #

Functor (These a) 
Instance details

Defined in Data.These

Methods

fmap :: (a0 -> b) -> These a a0 -> These a b #

(<$) :: a0 -> These a b -> These a a0 #

Functor f => Functor (Lift f) 
Instance details

Defined in Control.Applicative.Lift

Methods

fmap :: (a -> b) -> Lift f a -> Lift f b #

(<$) :: a -> Lift f b -> Lift f a #

Functor m => Functor (ListT m) 
Instance details

Defined in Control.Monad.Trans.List

Methods

fmap :: (a -> b) -> ListT m a -> ListT m b #

(<$) :: a -> ListT m b -> ListT m a #

Functor m => Functor (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

fmap :: (a -> b) -> MaybeT m a -> MaybeT m b #

(<$) :: a -> MaybeT m b -> MaybeT m a #

Functor (StreamSpec streamType) 
Instance details

Defined in System.Process.Typed.Internal

Methods

fmap :: (a -> b) -> StreamSpec streamType a -> StreamSpec streamType b #

(<$) :: a -> StreamSpec streamType b -> StreamSpec streamType a #

Functor m => Functor (Conc m) 
Instance details

Defined in UnliftIO.Internals.Async

Methods

fmap :: (a -> b) -> Conc m a -> Conc m b #

(<$) :: a -> Conc m b -> Conc m a #

Monad m => Functor (Concurrently m)

Since: unliftio-0.1.0.0

Instance details

Defined in UnliftIO.Internals.Async

Methods

fmap :: (a -> b) -> Concurrently m a -> Concurrently m b #

(<$) :: a -> Concurrently m b -> Concurrently m a #

Functor (HashMap k) 
Instance details

Defined in Data.HashMap.Internal

Methods

fmap :: (a -> b) -> HashMap k a -> HashMap k b #

(<$) :: a -> HashMap k b -> HashMap k a #

Functor ((,) a)

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

fmap :: (a0 -> b) -> (a, a0) -> (a, b) #

(<$) :: a0 -> (a, b) -> (a, a0) #

Arrow a => Functor (WrappedArrow a b)

Since: base-2.1

Instance details

Defined in Control.Applicative

Methods

fmap :: (a0 -> b0) -> WrappedArrow a b a0 -> WrappedArrow a b b0 #

(<$) :: a0 -> WrappedArrow a b b0 -> WrappedArrow a b a0 #

Functor m => Functor (Kleisli m a)

Since: base-4.14.0.0

Instance details

Defined in Control.Arrow

Methods

fmap :: (a0 -> b) -> Kleisli m a a0 -> Kleisli m a b #

(<$) :: a0 -> Kleisli m a b -> Kleisli m a a0 #

Functor (Const m :: Type -> Type)

Since: base-2.1

Instance details

Defined in Data.Functor.Const

Methods

fmap :: (a -> b) -> Const m a -> Const m b #

(<$) :: a -> Const m b -> Const m a #

Functor f => Functor (Ap f)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

fmap :: (a -> b) -> Ap f a -> Ap f b #

(<$) :: a -> Ap f b -> Ap f a #

Functor f => Functor (Alt f)

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

fmap :: (a -> b) -> Alt f a -> Alt f b #

(<$) :: a -> Alt f b -> Alt f a #

Functor f => Functor (Rec1 f)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> Rec1 f a -> Rec1 f b #

(<$) :: a -> Rec1 f b -> Rec1 f a #

Functor (URec (Ptr ()) :: TYPE LiftedRep -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> URec (Ptr ()) a -> URec (Ptr ()) b #

(<$) :: a -> URec (Ptr ()) b -> URec (Ptr ()) a #

Functor (URec Char :: TYPE LiftedRep -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> URec Char a -> URec Char b #

(<$) :: a -> URec Char b -> URec Char a #

Functor (URec Double :: TYPE LiftedRep -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> URec Double a -> URec Double b #

(<$) :: a -> URec Double b -> URec Double a #

Functor (URec Float :: TYPE LiftedRep -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> URec Float a -> URec Float b #

(<$) :: a -> URec Float b -> URec Float a #

Functor (URec Int :: TYPE LiftedRep -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> URec Int a -> URec Int b #

(<$) :: a -> URec Int b -> URec Int a #

Functor (URec Word :: TYPE LiftedRep -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> URec Word a -> URec Word b #

(<$) :: a -> URec Word b -> URec Word a #

Functor (Mag a b) 
Instance details

Defined in Data.Biapplicative

Methods

fmap :: (a0 -> b0) -> Mag a b a0 -> Mag a b b0 #

(<$) :: a0 -> Mag a b b0 -> Mag a b a0 #

Bifunctor p => Functor (Fix p) 
Instance details

Defined in Data.Bifunctor.Fix

Methods

fmap :: (a -> b) -> Fix p a -> Fix p b #

(<$) :: a -> Fix p b -> Fix p a #

Bifunctor p => Functor (Join p) 
Instance details

Defined in Data.Bifunctor.Join

Methods

fmap :: (a -> b) -> Join p a -> Join p b #

(<$) :: a -> Join p b -> Join p a #

Monad m => Functor (ZipSink i m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

fmap :: (a -> b) -> ZipSink i m a -> ZipSink i m b #

(<$) :: a -> ZipSink i m b -> ZipSink i m a #

(Applicative f, Monad f) => Functor (WhenMissing f x)

Since: containers-0.5.9

Instance details

Defined in Data.IntMap.Internal

Methods

fmap :: (a -> b) -> WhenMissing f x a -> WhenMissing f x b #

(<$) :: a -> WhenMissing f x b -> WhenMissing f x a #

Functor f => Functor (CofreeF f a) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

fmap :: (a0 -> b) -> CofreeF f a a0 -> CofreeF f a b #

(<$) :: a0 -> CofreeF f a b -> CofreeF f a a0 #

(Functor f, Functor w) => Functor (CofreeT f w) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

fmap :: (a -> b) -> CofreeT f w a -> CofreeT f w b #

(<$) :: a -> CofreeT f w b -> CofreeT f w a #

Functor f => Functor (FreeF f a) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

fmap :: (a0 -> b) -> FreeF f a a0 -> FreeF f a b #

(<$) :: a0 -> FreeF f a b -> FreeF f a a0 #

(Functor f, Functor m) => Functor (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

fmap :: (a -> b) -> FreeT f m a -> FreeT f m b #

(<$) :: a -> FreeT f m b -> FreeT f m a #

Functor (Day f g) 
Instance details

Defined in Data.Functor.Day

Methods

fmap :: (a -> b) -> Day f g a -> Day f g b #

(<$) :: a -> Day f g b -> Day f g a #

Functor (Indexed i a) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

fmap :: (a0 -> b) -> Indexed i a a0 -> Indexed i a b #

(<$) :: a0 -> Indexed i a b -> Indexed i a a0 #

Functor (ReifiedIndexedFold i s) 
Instance details

Defined in Control.Lens.Reified

Methods

fmap :: (a -> b) -> ReifiedIndexedFold i s a -> ReifiedIndexedFold i s b #

(<$) :: a -> ReifiedIndexedFold i s b -> ReifiedIndexedFold i s a #

Functor (ReifiedIndexedGetter i s) 
Instance details

Defined in Control.Lens.Reified

Methods

fmap :: (a -> b) -> ReifiedIndexedGetter i s a -> ReifiedIndexedGetter i s b #

(<$) :: a -> ReifiedIndexedGetter i s b -> ReifiedIndexedGetter i s a #

Functor (Bazaar a b) 
Instance details

Defined in Lens.Micro

Methods

fmap :: (a0 -> b0) -> Bazaar a b a0 -> Bazaar a b b0 #

(<$) :: a0 -> Bazaar a b b0 -> Bazaar a b a0 #

Functor m => Functor (StateT s m) 
Instance details

Defined in Lens.Micro

Methods

fmap :: (a -> b) -> StateT s m a -> StateT s m b #

(<$) :: a -> StateT s m b -> StateT s m a #

Functor (Effect m r) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

fmap :: (a -> b) -> Effect m r a -> Effect m r b #

(<$) :: a -> Effect m r b -> Effect m r a #

Monad m => Functor (Focusing m s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

fmap :: (a -> b) -> Focusing m s a -> Focusing m s b #

(<$) :: a -> Focusing m s b -> Focusing m s a #

Functor (k (May s)) => Functor (FocusingMay k s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

fmap :: (a -> b) -> FocusingMay k s a -> FocusingMay k s b #

(<$) :: a -> FocusingMay k s b -> FocusingMay k s a #

Functor (CopastroSum p a) 
Instance details

Defined in Data.Profunctor.Choice

Methods

fmap :: (a0 -> b) -> CopastroSum p a a0 -> CopastroSum p a b #

(<$) :: a0 -> CopastroSum p a b -> CopastroSum p a a0 #

Functor (CotambaraSum p a) 
Instance details

Defined in Data.Profunctor.Choice

Methods

fmap :: (a0 -> b) -> CotambaraSum p a a0 -> CotambaraSum p a b #

(<$) :: a0 -> CotambaraSum p a b -> CotambaraSum p a a0 #

Functor (PastroSum p a) 
Instance details

Defined in Data.Profunctor.Choice

Methods

fmap :: (a0 -> b) -> PastroSum p a a0 -> PastroSum p a b #

(<$) :: a0 -> PastroSum p a b -> PastroSum p a a0 #

Profunctor p => Functor (TambaraSum p a) 
Instance details

Defined in Data.Profunctor.Choice

Methods

fmap :: (a0 -> b) -> TambaraSum p a a0 -> TambaraSum p a b #

(<$) :: a0 -> TambaraSum p a b -> TambaraSum p a a0 #

Profunctor p => Functor (Coprep p) 
Instance details

Defined in Data.Profunctor.Rep

Methods

fmap :: (a -> b) -> Coprep p a -> Coprep p b #

(<$) :: a -> Coprep p b -> Coprep p a #

Profunctor p => Functor (Prep p) 
Instance details

Defined in Data.Profunctor.Rep

Methods

fmap :: (a -> b) -> Prep p a -> Prep p b #

(<$) :: a -> Prep p b -> Prep p a #

Functor m => Functor (AppT app m) Source # 
Instance details

Defined in Stackctl.CLI

Methods

fmap :: (a -> b) -> AppT app m a -> AppT app m b #

(<$) :: a -> AppT app m b -> AppT app m a #

Functor (Tagged s) 
Instance details

Defined in Data.Tagged

Methods

fmap :: (a -> b) -> Tagged s a -> Tagged s b #

(<$) :: a -> Tagged s b -> Tagged s a #

(Functor f, Functor g) => Functor (These1 f g) 
Instance details

Defined in Data.Functor.These

Methods

fmap :: (a -> b) -> These1 f g a -> These1 f g b #

(<$) :: a -> These1 f g b -> These1 f g a #

Functor f => Functor (Backwards f)

Derived instance.

Instance details

Defined in Control.Applicative.Backwards

Methods

fmap :: (a -> b) -> Backwards f a -> Backwards f b #

(<$) :: a -> Backwards f b -> Backwards f a #

Functor m => Functor (AccumT w m) 
Instance details

Defined in Control.Monad.Trans.Accum

Methods

fmap :: (a -> b) -> AccumT w m a -> AccumT w m b #

(<$) :: a -> AccumT w m b -> AccumT w m a #

Functor m => Functor (ErrorT e m) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

fmap :: (a -> b) -> ErrorT e m a -> ErrorT e m b #

(<$) :: a -> ErrorT e m b -> ErrorT e m a #

Functor m => Functor (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

fmap :: (a -> b) -> ExceptT e m a -> ExceptT e m b #

(<$) :: a -> ExceptT e m b -> ExceptT e m a #

Functor m => Functor (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

fmap :: (a -> b) -> IdentityT m a -> IdentityT m b #

(<$) :: a -> IdentityT m b -> IdentityT m a #

Functor m => Functor (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

fmap :: (a -> b) -> ReaderT r m a -> ReaderT r m b #

(<$) :: a -> ReaderT r m b -> ReaderT r m a #

Functor m => Functor (SelectT r m) 
Instance details

Defined in Control.Monad.Trans.Select

Methods

fmap :: (a -> b) -> SelectT r m a -> SelectT r m b #

(<$) :: a -> SelectT r m b -> SelectT r m a #

Functor m => Functor (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Lazy

Methods

fmap :: (a -> b) -> StateT s m a -> StateT s m b #

(<$) :: a -> StateT s m b -> StateT s m a #

Functor m => Functor (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

fmap :: (a -> b) -> StateT s m a -> StateT s m b #

(<$) :: a -> StateT s m b -> StateT s m a #

Functor m => Functor (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

fmap :: (a -> b) -> WriterT w m a -> WriterT w m b #

(<$) :: a -> WriterT w m b -> WriterT w m a #

Functor m => Functor (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

fmap :: (a -> b) -> WriterT w m a -> WriterT w m b #

(<$) :: a -> WriterT w m b -> WriterT w m a #

Functor (Constant a :: Type -> Type) 
Instance details

Defined in Data.Functor.Constant

Methods

fmap :: (a0 -> b) -> Constant a a0 -> Constant a b #

(<$) :: a0 -> Constant a b -> Constant a a0 #

Functor f => Functor (Reverse f)

Derived instance.

Instance details

Defined in Data.Functor.Reverse

Methods

fmap :: (a -> b) -> Reverse f a -> Reverse f b #

(<$) :: a -> Reverse f b -> Reverse f a #

Monad m => Functor (Bundle m v) 
Instance details

Defined in Data.Vector.Fusion.Bundle.Monadic

Methods

fmap :: (a -> b) -> Bundle m v a -> Bundle m v b #

(<$) :: a -> Bundle m v b -> Bundle m v a #

Functor ((,,) a b)

Since: base-4.14.0.0

Instance details

Defined in GHC.Base

Methods

fmap :: (a0 -> b0) -> (a, b, a0) -> (a, b, b0) #

(<$) :: a0 -> (a, b, b0) -> (a, b, a0) #

(Functor f, Functor g) => Functor (Product f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Product

Methods

fmap :: (a -> b) -> Product f g a -> Product f g b #

(<$) :: a -> Product f g b -> Product f g a #

(Functor f, Functor g) => Functor (Sum f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Sum

Methods

fmap :: (a -> b) -> Sum f g a -> Sum f g b #

(<$) :: a -> Sum f g b -> Sum f g a #

(Functor f, Functor g) => Functor (f :*: g)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> (f :*: g) a -> (f :*: g) b #

(<$) :: a -> (f :*: g) b -> (f :*: g) a #

(Functor f, Functor g) => Functor (f :+: g)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> (f :+: g) a -> (f :+: g) b #

(<$) :: a -> (f :+: g) b -> (f :+: g) a #

Functor (K1 i c :: TYPE LiftedRep -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> K1 i c a -> K1 i c b #

(<$) :: a -> K1 i c b -> K1 i c a #

Functor (ConduitT i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

fmap :: (a -> b) -> ConduitT i o m a -> ConduitT i o m b #

(<$) :: a -> ConduitT i o m b -> ConduitT i o m a #

Functor (ZipConduit i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

fmap :: (a -> b) -> ZipConduit i o m a -> ZipConduit i o m b #

(<$) :: a -> ZipConduit i o m b -> ZipConduit i o m a #

Functor f => Functor (WhenMatched f x y)

Since: containers-0.5.9

Instance details

Defined in Data.IntMap.Internal

Methods

fmap :: (a -> b) -> WhenMatched f x y a -> WhenMatched f x y b #

(<$) :: a -> WhenMatched f x y b -> WhenMatched f x y a #

(Applicative f, Monad f) => Functor (WhenMissing f k x)

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

fmap :: (a -> b) -> WhenMissing f k x a -> WhenMissing f k x b #

(<$) :: a -> WhenMissing f k x b -> WhenMissing f k x a #

Functor (k (Err e s)) => Functor (FocusingErr e k s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

fmap :: (a -> b) -> FocusingErr e k s a -> FocusingErr e k s b #

(<$) :: a -> FocusingErr e k s b -> FocusingErr e k s a #

Functor (k (f s)) => Functor (FocusingOn f k s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

fmap :: (a -> b) -> FocusingOn f k s a -> FocusingOn f k s b #

(<$) :: a -> FocusingOn f k s b -> FocusingOn f k s a #

Functor (k (s, w)) => Functor (FocusingPlus w k s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

fmap :: (a -> b) -> FocusingPlus w k s a -> FocusingPlus w k s b #

(<$) :: a -> FocusingPlus w k s b -> FocusingPlus w k s a #

Monad m => Functor (FocusingWith w m s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

fmap :: (a -> b) -> FocusingWith w m s a -> FocusingWith w m s b #

(<$) :: a -> FocusingWith w m s b -> FocusingWith w m s a #

Functor (ContT r m) 
Instance details

Defined in Control.Monad.Trans.Cont

Methods

fmap :: (a -> b) -> ContT r m a -> ContT r m b #

(<$) :: a -> ContT r m b -> ContT r m a #

Functor ((,,,) a b c)

Since: base-4.14.0.0

Instance details

Defined in GHC.Base

Methods

fmap :: (a0 -> b0) -> (a, b, c, a0) -> (a, b, c, b0) #

(<$) :: a0 -> (a, b, c, b0) -> (a, b, c, a0) #

Functor ((->) r)

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

fmap :: (a -> b) -> (r -> a) -> r -> b #

(<$) :: a -> (r -> b) -> r -> a #

(Functor f, Functor g) => Functor (Compose f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

fmap :: (a -> b) -> Compose f g a -> Compose f g b #

(<$) :: a -> Compose f g b -> Compose f g a #

(Functor f, Functor g) => Functor (f :.: g)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> (f :.: g) a -> (f :.: g) b #

(<$) :: a -> (f :.: g) b -> (f :.: g) a #

Functor f => Functor (M1 i c f)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> M1 i c f a -> M1 i c f b #

(<$) :: a -> M1 i c f b -> M1 i c f a #

Functor (Clown f a :: Type -> Type) 
Instance details

Defined in Data.Bifunctor.Clown

Methods

fmap :: (a0 -> b) -> Clown f a a0 -> Clown f a b #

(<$) :: a0 -> Clown f a b -> Clown f a a0 #

Bifunctor p => Functor (Flip p a) 
Instance details

Defined in Data.Bifunctor.Flip

Methods

fmap :: (a0 -> b) -> Flip p a a0 -> Flip p a b #

(<$) :: a0 -> Flip p a b -> Flip p a a0 #

Functor g => Functor (Joker g a) 
Instance details

Defined in Data.Bifunctor.Joker

Methods

fmap :: (a0 -> b) -> Joker g a a0 -> Joker g a b #

(<$) :: a0 -> Joker g a b -> Joker g a a0 #

Bifunctor p => Functor (WrappedBifunctor p a) 
Instance details

Defined in Data.Bifunctor.Wrapped

Methods

fmap :: (a0 -> b) -> WrappedBifunctor p a a0 -> WrappedBifunctor p a b #

(<$) :: a0 -> WrappedBifunctor p a b -> WrappedBifunctor p a a0 #

Functor f => Functor (WhenMatched f k x y)

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

fmap :: (a -> b) -> WhenMatched f k x y a -> WhenMatched f k x y b #

(<$) :: a -> WhenMatched f k x y b -> WhenMatched f k x y a #

Functor (EffectRWS w st m s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

fmap :: (a -> b) -> EffectRWS w st m s a -> EffectRWS w st m s b #

(<$) :: a -> EffectRWS w st m s b -> EffectRWS w st m s a #

Reifies s (ReifiedApplicative f) => Functor (ReflectedApplicative f s) 
Instance details

Defined in Data.Reflection

Methods

fmap :: (a -> b) -> ReflectedApplicative f s a -> ReflectedApplicative f s b #

(<$) :: a -> ReflectedApplicative f s b -> ReflectedApplicative f s a #

Functor m => Functor (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.Lazy

Methods

fmap :: (a -> b) -> RWST r w s m a -> RWST r w s m b #

(<$) :: a -> RWST r w s m b -> RWST r w s m a #

Functor m => Functor (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.Strict

Methods

fmap :: (a -> b) -> RWST r w s m a -> RWST r w s m b #

(<$) :: a -> RWST r w s m b -> RWST r w s m a #

Monad state => Functor (Builder collection mutCollection step state err) 
Instance details

Defined in Basement.MutableBuilder

Methods

fmap :: (a -> b) -> Builder collection mutCollection step state err a -> Builder collection mutCollection step state err b #

(<$) :: a -> Builder collection mutCollection step state err b -> Builder collection mutCollection step state err a #

(Functor (f a), Functor (g a)) => Functor (Product f g a) 
Instance details

Defined in Data.Bifunctor.Product

Methods

fmap :: (a0 -> b) -> Product f g a a0 -> Product f g a b #

(<$) :: a0 -> Product f g a b -> Product f g a a0 #

(Functor (f a), Functor (g a)) => Functor (Sum f g a) 
Instance details

Defined in Data.Bifunctor.Sum

Methods

fmap :: (a0 -> b) -> Sum f g a a0 -> Sum f g a b #

(<$) :: a0 -> Sum f g a b -> Sum f g a a0 #

Monad m => Functor (Pipe l i o u m) 
Instance details

Defined in Data.Conduit.Internal.Pipe

Methods

fmap :: (a -> b) -> Pipe l i o u m a -> Pipe l i o u m b #

(<$) :: a -> Pipe l i o u m b -> Pipe l i o u m a #

(Functor f, Bifunctor p) => Functor (Tannen f p a) 
Instance details

Defined in Data.Bifunctor.Tannen

Methods

fmap :: (a0 -> b) -> Tannen f p a a0 -> Tannen f p a b #

(<$) :: a0 -> Tannen f p a b -> Tannen f p a a0 #

Profunctor p => Functor (Procompose p q a) 
Instance details

Defined in Data.Profunctor.Composition

Methods

fmap :: (a0 -> b) -> Procompose p q a a0 -> Procompose p q a b #

(<$) :: a0 -> Procompose p q a b -> Procompose p q a a0 #

Profunctor p => Functor (Rift p q a) 
Instance details

Defined in Data.Profunctor.Composition

Methods

fmap :: (a0 -> b) -> Rift p q a a0 -> Rift p q a b #

(<$) :: a0 -> Rift p q a b -> Rift p q a a0 #

(Bifunctor p, Functor g) => Functor (Biff p f g a) 
Instance details

Defined in Data.Bifunctor.Biff

Methods

fmap :: (a0 -> b) -> Biff p f g a a0 -> Biff p f g a b #

(<$) :: a0 -> Biff p f g a b -> Biff p f g a a0 #

class Num a where #

Basic numeric class.

The Haskell Report defines no laws for Num. However, (+) and (*) are customarily expected to define a ring and have the following properties:

Associativity of (+)
(x + y) + z = x + (y + z)
Commutativity of (+)
x + y = y + x
fromInteger 0 is the additive identity
x + fromInteger 0 = x
negate gives the additive inverse
x + negate x = fromInteger 0
Associativity of (*)
(x * y) * z = x * (y * z)
fromInteger 1 is the multiplicative identity
x * fromInteger 1 = x and fromInteger 1 * x = x
Distributivity of (*) with respect to (+)
a * (b + c) = (a * b) + (a * c) and (b + c) * a = (b * a) + (c * a)

Note that it isn't customarily expected that a type instance of both Num and Ord implement an ordered ring. Indeed, in base only Integer and Rational do.

Minimal complete definition

(+), (*), abs, signum, fromInteger, (negate | (-))

Methods

(+) :: a -> a -> a infixl 6 #

(-) :: a -> a -> a infixl 6 #

(*) :: a -> a -> a infixl 7 #

negate :: a -> a #

Unary negation.

abs :: a -> a #

Absolute value.

signum :: a -> a #

Sign of a number. The functions abs and signum should satisfy the law:

abs x * signum x == x

For real numbers, the signum is either -1 (negative), 0 (zero) or 1 (positive).

fromInteger :: Integer -> a #

Conversion from an Integer. An integer literal represents the application of the function fromInteger to the appropriate value of type Integer, so such literals have type (Num a) => a.

Instances

Instances details
Num ChunkSize 
Instance details

Defined in Amazonka.Data.Body

Num Seconds 
Instance details

Defined in Amazonka.Types

Num Pos 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

(+) :: Pos -> Pos -> Pos #

(-) :: Pos -> Pos -> Pos #

(*) :: Pos -> Pos -> Pos #

negate :: Pos -> Pos #

abs :: Pos -> Pos #

signum :: Pos -> Pos #

fromInteger :: Integer -> Pos #

Num CBool 
Instance details

Defined in Foreign.C.Types

Num CChar 
Instance details

Defined in Foreign.C.Types

Num CClock 
Instance details

Defined in Foreign.C.Types

Num CDouble 
Instance details

Defined in Foreign.C.Types

Num CFloat 
Instance details

Defined in Foreign.C.Types

Num CInt 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CInt -> CInt -> CInt #

(-) :: CInt -> CInt -> CInt #

(*) :: CInt -> CInt -> CInt #

negate :: CInt -> CInt #

abs :: CInt -> CInt #

signum :: CInt -> CInt #

fromInteger :: Integer -> CInt #

Num CIntMax 
Instance details

Defined in Foreign.C.Types

Num CIntPtr 
Instance details

Defined in Foreign.C.Types

Num CLLong 
Instance details

Defined in Foreign.C.Types

Num CLong 
Instance details

Defined in Foreign.C.Types

Num CPtrdiff 
Instance details

Defined in Foreign.C.Types

Num CSChar 
Instance details

Defined in Foreign.C.Types

Num CSUSeconds 
Instance details

Defined in Foreign.C.Types

Num CShort 
Instance details

Defined in Foreign.C.Types

Num CSigAtomic 
Instance details

Defined in Foreign.C.Types

Num CSize 
Instance details

Defined in Foreign.C.Types

Num CTime 
Instance details

Defined in Foreign.C.Types

Num CUChar 
Instance details

Defined in Foreign.C.Types

Num CUInt 
Instance details

Defined in Foreign.C.Types

Num CUIntMax 
Instance details

Defined in Foreign.C.Types

Num CUIntPtr 
Instance details

Defined in Foreign.C.Types

Num CULLong 
Instance details

Defined in Foreign.C.Types

Num CULong 
Instance details

Defined in Foreign.C.Types

Num CUSeconds 
Instance details

Defined in Foreign.C.Types

Num CUShort 
Instance details

Defined in Foreign.C.Types

Num CWchar 
Instance details

Defined in Foreign.C.Types

Num Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Num Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Num Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Num Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

(+) :: Int8 -> Int8 -> Int8 #

(-) :: Int8 -> Int8 -> Int8 #

(*) :: Int8 -> Int8 -> Int8 #

negate :: Int8 -> Int8 #

abs :: Int8 -> Int8 #

signum :: Int8 -> Int8 #

fromInteger :: Integer -> Int8 #

Num Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Num Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Num Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Num Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Num CBlkCnt 
Instance details

Defined in System.Posix.Types

Num CBlkSize 
Instance details

Defined in System.Posix.Types

Num CCc 
Instance details

Defined in System.Posix.Types

Methods

(+) :: CCc -> CCc -> CCc #

(-) :: CCc -> CCc -> CCc #

(*) :: CCc -> CCc -> CCc #

negate :: CCc -> CCc #

abs :: CCc -> CCc #

signum :: CCc -> CCc #

fromInteger :: Integer -> CCc #

Num CClockId 
Instance details

Defined in System.Posix.Types

Num CDev 
Instance details

Defined in System.Posix.Types

Methods

(+) :: CDev -> CDev -> CDev #

(-) :: CDev -> CDev -> CDev #

(*) :: CDev -> CDev -> CDev #

negate :: CDev -> CDev #

abs :: CDev -> CDev #

signum :: CDev -> CDev #

fromInteger :: Integer -> CDev #

Num CFsBlkCnt 
Instance details

Defined in System.Posix.Types

Num CFsFilCnt 
Instance details

Defined in System.Posix.Types

Num CGid 
Instance details

Defined in System.Posix.Types

Methods

(+) :: CGid -> CGid -> CGid #

(-) :: CGid -> CGid -> CGid #

(*) :: CGid -> CGid -> CGid #

negate :: CGid -> CGid #

abs :: CGid -> CGid #

signum :: CGid -> CGid #

fromInteger :: Integer -> CGid #

Num CId 
Instance details

Defined in System.Posix.Types

Methods

(+) :: CId -> CId -> CId #

(-) :: CId -> CId -> CId #

(*) :: CId -> CId -> CId #

negate :: CId -> CId #

abs :: CId -> CId #

signum :: CId -> CId #

fromInteger :: Integer -> CId #

Num CIno 
Instance details

Defined in System.Posix.Types

Methods

(+) :: CIno -> CIno -> CIno #

(-) :: CIno -> CIno -> CIno #

(*) :: CIno -> CIno -> CIno #

negate :: CIno -> CIno #

abs :: CIno -> CIno #

signum :: CIno -> CIno #

fromInteger :: Integer -> CIno #

Num CKey 
Instance details

Defined in System.Posix.Types

Methods

(+) :: CKey -> CKey -> CKey #

(-) :: CKey -> CKey -> CKey #

(*) :: CKey -> CKey -> CKey #

negate :: CKey -> CKey #

abs :: CKey -> CKey #

signum :: CKey -> CKey #

fromInteger :: Integer -> CKey #

Num CMode 
Instance details

Defined in System.Posix.Types

Num CNfds 
Instance details

Defined in System.Posix.Types

Num CNlink 
Instance details

Defined in System.Posix.Types

Num COff 
Instance details

Defined in System.Posix.Types

Methods

(+) :: COff -> COff -> COff #

(-) :: COff -> COff -> COff #

(*) :: COff -> COff -> COff #

negate :: COff -> COff #

abs :: COff -> COff #

signum :: COff -> COff #

fromInteger :: Integer -> COff #

Num CPid 
Instance details

Defined in System.Posix.Types

Methods

(+) :: CPid -> CPid -> CPid #

(-) :: CPid -> CPid -> CPid #

(*) :: CPid -> CPid -> CPid #

negate :: CPid -> CPid #

abs :: CPid -> CPid #

signum :: CPid -> CPid #

fromInteger :: Integer -> CPid #

Num CRLim 
Instance details

Defined in System.Posix.Types

Num CSocklen 
Instance details

Defined in System.Posix.Types

Num CSpeed 
Instance details

Defined in System.Posix.Types

Num CSsize 
Instance details

Defined in System.Posix.Types

Num CTcflag 
Instance details

Defined in System.Posix.Types

Num CUid 
Instance details

Defined in System.Posix.Types

Methods

(+) :: CUid -> CUid -> CUid #

(-) :: CUid -> CUid -> CUid #

(*) :: CUid -> CUid -> CUid #

negate :: CUid -> CUid #

abs :: CUid -> CUid #

signum :: CUid -> CUid #

fromInteger :: Integer -> CUid #

Num Fd 
Instance details

Defined in System.Posix.Types

Methods

(+) :: Fd -> Fd -> Fd #

(-) :: Fd -> Fd -> Fd #

(*) :: Fd -> Fd -> Fd #

negate :: Fd -> Fd #

abs :: Fd -> Fd #

signum :: Fd -> Fd #

fromInteger :: Integer -> Fd #

Num Scientific

WARNING: + and - compute the Integer magnitude: 10^e where e is the difference between the base10Exponents of the arguments. If these methods are applied to arguments which have huge exponents this could fill up all space and crash your program! So don't apply these methods to scientific numbers coming from untrusted sources. The other methods can be used safely.

Instance details

Defined in Data.Scientific

Num CodePoint 
Instance details

Defined in Data.Text.Encoding

Methods

(+) :: CodePoint -> CodePoint -> CodePoint #

(-) :: CodePoint -> CodePoint -> CodePoint #

(*) :: CodePoint -> CodePoint -> CodePoint #

negate :: CodePoint -> CodePoint #

abs :: CodePoint -> CodePoint #

signum :: CodePoint -> CodePoint #

fromInteger :: Integer -> CodePoint #

Num DecoderState 
Instance details

Defined in Data.Text.Encoding

Methods

(+) :: DecoderState -> DecoderState -> DecoderState #

(-) :: DecoderState -> DecoderState -> DecoderState #

(*) :: DecoderState -> DecoderState -> DecoderState #

negate :: DecoderState -> DecoderState #

abs :: DecoderState -> DecoderState #

signum :: DecoderState -> DecoderState #

fromInteger :: Integer -> DecoderState #

Num B 
Instance details

Defined in Data.Text.Short.Internal

Methods

(+) :: B -> B -> B #

(-) :: B -> B -> B #

(*) :: B -> B -> B #

negate :: B -> B #

abs :: B -> B #

signum :: B -> B #

fromInteger :: Integer -> B #

Num DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Num Integer

Since: base-2.1

Instance details

Defined in GHC.Num

Num Natural

Note that Natural's Num instance isn't a ring: no element but 0 has an additive inverse. It is a semiring though.

Since: base-4.8.0.0

Instance details

Defined in GHC.Num

Num Int

Since: base-2.1

Instance details

Defined in GHC.Num

Methods

(+) :: Int -> Int -> Int #

(-) :: Int -> Int -> Int #

(*) :: Int -> Int -> Int #

negate :: Int -> Int #

abs :: Int -> Int #

signum :: Int -> Int #

fromInteger :: Integer -> Int #

Num Word

Since: base-2.1

Instance details

Defined in GHC.Num

Methods

(+) :: Word -> Word -> Word #

(-) :: Word -> Word -> Word #

(*) :: Word -> Word -> Word #

negate :: Word -> Word #

abs :: Word -> Word #

signum :: Word -> Word #

fromInteger :: Integer -> Word #

Num a => Num (Blind a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(+) :: Blind a -> Blind a -> Blind a #

(-) :: Blind a -> Blind a -> Blind a #

(*) :: Blind a -> Blind a -> Blind a #

negate :: Blind a -> Blind a #

abs :: Blind a -> Blind a #

signum :: Blind a -> Blind a #

fromInteger :: Integer -> Blind a #

Num a => Num (Fixed a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(+) :: Fixed a -> Fixed a -> Fixed a #

(-) :: Fixed a -> Fixed a -> Fixed a #

(*) :: Fixed a -> Fixed a -> Fixed a #

negate :: Fixed a -> Fixed a #

abs :: Fixed a -> Fixed a #

signum :: Fixed a -> Fixed a #

fromInteger :: Integer -> Fixed a #

Num a => Num (Large a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(+) :: Large a -> Large a -> Large a #

(-) :: Large a -> Large a -> Large a #

(*) :: Large a -> Large a -> Large a #

negate :: Large a -> Large a #

abs :: Large a -> Large a #

signum :: Large a -> Large a #

fromInteger :: Integer -> Large a #

Num a => Num (Shrink2 a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(+) :: Shrink2 a -> Shrink2 a -> Shrink2 a #

(-) :: Shrink2 a -> Shrink2 a -> Shrink2 a #

(*) :: Shrink2 a -> Shrink2 a -> Shrink2 a #

negate :: Shrink2 a -> Shrink2 a #

abs :: Shrink2 a -> Shrink2 a #

signum :: Shrink2 a -> Shrink2 a #

fromInteger :: Integer -> Shrink2 a #

Num a => Num (Small a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(+) :: Small a -> Small a -> Small a #

(-) :: Small a -> Small a -> Small a #

(*) :: Small a -> Small a -> Small a #

negate :: Small a -> Small a #

abs :: Small a -> Small a #

signum :: Small a -> Small a #

fromInteger :: Integer -> Small a #

RealFloat a => Num (Complex a)

Since: base-2.1

Instance details

Defined in Data.Complex

Methods

(+) :: Complex a -> Complex a -> Complex a #

(-) :: Complex a -> Complex a -> Complex a #

(*) :: Complex a -> Complex a -> Complex a #

negate :: Complex a -> Complex a #

abs :: Complex a -> Complex a #

signum :: Complex a -> Complex a #

fromInteger :: Integer -> Complex a #

Num a => Num (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Num a => Num (Down a)

Since: base-4.11.0.0

Instance details

Defined in Data.Ord

Methods

(+) :: Down a -> Down a -> Down a #

(-) :: Down a -> Down a -> Down a #

(*) :: Down a -> Down a -> Down a #

negate :: Down a -> Down a #

abs :: Down a -> Down a #

signum :: Down a -> Down a #

fromInteger :: Integer -> Down a #

Num a => Num (Max a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(+) :: Max a -> Max a -> Max a #

(-) :: Max a -> Max a -> Max a #

(*) :: Max a -> Max a -> Max a #

negate :: Max a -> Max a #

abs :: Max a -> Max a #

signum :: Max a -> Max a #

fromInteger :: Integer -> Max a #

Num a => Num (Min a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(+) :: Min a -> Min a -> Min a #

(-) :: Min a -> Min a -> Min a #

(*) :: Min a -> Min a -> Min a #

negate :: Min a -> Min a #

abs :: Min a -> Min a #

signum :: Min a -> Min a #

fromInteger :: Integer -> Min a #

Num a => Num (Product a)

Since: base-4.7.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

(+) :: Product a -> Product a -> Product a #

(-) :: Product a -> Product a -> Product a #

(*) :: Product a -> Product a -> Product a #

negate :: Product a -> Product a #

abs :: Product a -> Product a #

signum :: Product a -> Product a #

fromInteger :: Integer -> Product a #

Num a => Num (Sum a)

Since: base-4.7.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

(+) :: Sum a -> Sum a -> Sum a #

(-) :: Sum a -> Sum a -> Sum a #

(*) :: Sum a -> Sum a -> Sum a #

negate :: Sum a -> Sum a #

abs :: Sum a -> Sum a #

signum :: Sum a -> Sum a #

fromInteger :: Integer -> Sum a #

Integral a => Num (Ratio a)

Since: base-2.0.1

Instance details

Defined in GHC.Real

Methods

(+) :: Ratio a -> Ratio a -> Ratio a #

(-) :: Ratio a -> Ratio a -> Ratio a #

(*) :: Ratio a -> Ratio a -> Ratio a #

negate :: Ratio a -> Ratio a #

abs :: Ratio a -> Ratio a #

signum :: Ratio a -> Ratio a #

fromInteger :: Integer -> Ratio a #

KnownNat n => Num (Zn n) 
Instance details

Defined in Basement.Bounded

Methods

(+) :: Zn n -> Zn n -> Zn n #

(-) :: Zn n -> Zn n -> Zn n #

(*) :: Zn n -> Zn n -> Zn n #

negate :: Zn n -> Zn n #

abs :: Zn n -> Zn n #

signum :: Zn n -> Zn n #

fromInteger :: Integer -> Zn n #

(KnownNat n, NatWithinBound Word64 n) => Num (Zn64 n) 
Instance details

Defined in Basement.Bounded

Methods

(+) :: Zn64 n -> Zn64 n -> Zn64 n #

(-) :: Zn64 n -> Zn64 n -> Zn64 n #

(*) :: Zn64 n -> Zn64 n -> Zn64 n #

negate :: Zn64 n -> Zn64 n #

abs :: Zn64 n -> Zn64 n #

signum :: Zn64 n -> Zn64 n #

fromInteger :: Integer -> Zn64 n #

Num (CountOf ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

(+) :: CountOf ty -> CountOf ty -> CountOf ty #

(-) :: CountOf ty -> CountOf ty -> CountOf ty #

(*) :: CountOf ty -> CountOf ty -> CountOf ty #

negate :: CountOf ty -> CountOf ty #

abs :: CountOf ty -> CountOf ty #

signum :: CountOf ty -> CountOf ty #

fromInteger :: Integer -> CountOf ty #

Num (Offset ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

(+) :: Offset ty -> Offset ty -> Offset ty #

(-) :: Offset ty -> Offset ty -> Offset ty #

(*) :: Offset ty -> Offset ty -> Offset ty #

negate :: Offset ty -> Offset ty #

abs :: Offset ty -> Offset ty #

signum :: Offset ty -> Offset ty #

fromInteger :: Integer -> Offset ty #

Num a => Num (Op a b) 
Instance details

Defined in Data.Functor.Contravariant

Methods

(+) :: Op a b -> Op a b -> Op a b #

(-) :: Op a b -> Op a b -> Op a b #

(*) :: Op a b -> Op a b -> Op a b #

negate :: Op a b -> Op a b #

abs :: Op a b -> Op a b #

signum :: Op a b -> Op a b #

fromInteger :: Integer -> Op a b #

Num a => Num (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

(+) :: Const a b -> Const a b -> Const a b #

(-) :: Const a b -> Const a b -> Const a b #

(*) :: Const a b -> Const a b -> Const a b #

negate :: Const a b -> Const a b #

abs :: Const a b -> Const a b #

signum :: Const a b -> Const a b #

fromInteger :: Integer -> Const a b #

(Applicative f, Num a) => Num (Ap f a)

Note that even if the underlying Num and Applicative instances are lawful, for most Applicatives, this instance will not be lawful. If you use this instance with the list Applicative, the following customary laws will not hold:

Commutativity:

>>> Ap [10,20] + Ap [1,2]
Ap {getAp = [11,12,21,22]}
>>> Ap [1,2] + Ap [10,20]
Ap {getAp = [11,21,12,22]}

Additive inverse:

>>> Ap [] + negate (Ap [])
Ap {getAp = []}
>>> fromInteger 0 :: Ap [] Int
Ap {getAp = [0]}

Distributivity:

>>> Ap [1,2] * (3 + 4)
Ap {getAp = [7,14]}
>>> (Ap [1,2] * 3) + (Ap [1,2] * 4)
Ap {getAp = [7,11,10,14]}

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

(+) :: Ap f a -> Ap f a -> Ap f a #

(-) :: Ap f a -> Ap f a -> Ap f a #

(*) :: Ap f a -> Ap f a -> Ap f a #

negate :: Ap f a -> Ap f a #

abs :: Ap f a -> Ap f a #

signum :: Ap f a -> Ap f a #

fromInteger :: Integer -> Ap f a #

Num (f a) => Num (Alt f a)

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

(+) :: Alt f a -> Alt f a -> Alt f a #

(-) :: Alt f a -> Alt f a -> Alt f a #

(*) :: Alt f a -> Alt f a -> Alt f a #

negate :: Alt f a -> Alt f a #

abs :: Alt f a -> Alt f a #

signum :: Alt f a -> Alt f a #

fromInteger :: Integer -> Alt f a #

Num a => Num (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

(+) :: Tagged s a -> Tagged s a -> Tagged s a #

(-) :: Tagged s a -> Tagged s a -> Tagged s a #

(*) :: Tagged s a -> Tagged s a -> Tagged s a #

negate :: Tagged s a -> Tagged s a #

abs :: Tagged s a -> Tagged s a #

signum :: Tagged s a -> Tagged s a #

fromInteger :: Integer -> Tagged s a #

class Eq a => Ord a where #

The Ord class is used for totally ordered datatypes.

Instances of Ord can be derived for any user-defined datatype whose constituent types are in Ord. The declared order of the constructors in the data declaration determines the ordering in derived Ord instances. The Ordering datatype allows a single comparison to determine the precise ordering of two objects.

Ord, as defined by the Haskell report, implements a total order and has the following properties:

Comparability
x <= y || y <= x = True
Transitivity
if x <= y && y <= z = True, then x <= z = True
Reflexivity
x <= x = True
Antisymmetry
if x <= y && y <= x = True, then x == y = True

The following operator interactions are expected to hold:

  1. x >= y = y <= x
  2. x < y = x <= y && x /= y
  3. x > y = y < x
  4. x < y = compare x y == LT
  5. x > y = compare x y == GT
  6. x == y = compare x y == EQ
  7. min x y == if x <= y then x else y = True
  8. max x y == if x >= y then x else y = True

Note that (7.) and (8.) do not require min and max to return either of their arguments. The result is merely required to equal one of the arguments in terms of (==).

Minimal complete definition: either compare or <=. Using compare can be more efficient for complex types.

Minimal complete definition

compare | (<=)

Methods

compare :: a -> a -> Ordering #

(<) :: a -> a -> Bool infix 4 #

(<=) :: a -> a -> Bool infix 4 #

(>) :: a -> a -> Bool infix 4 #

(>=) :: a -> a -> Bool infix 4 #

max :: a -> a -> a #

min :: a -> a -> a #

Instances

Instances details
Ord ASCIIString 
Instance details

Defined in Test.QuickCheck.Modifiers

Ord PrintableString 
Instance details

Defined in Test.QuickCheck.Modifiers

Ord UnicodeString 
Instance details

Defined in Test.QuickCheck.Modifiers

Ord Key 
Instance details

Defined in Data.Aeson.Key

Methods

compare :: Key -> Key -> Ordering #

(<) :: Key -> Key -> Bool #

(<=) :: Key -> Key -> Bool #

(>) :: Key -> Key -> Bool #

(>=) :: Key -> Key -> Bool #

max :: Key -> Key -> Key #

min :: Key -> Key -> Key #

Ord DotNetTime 
Instance details

Defined in Data.Aeson.Types.Internal

Ord JSONPathElement 
Instance details

Defined in Data.Aeson.Types.Internal

Ord Value

The ordering is total, consistent with Eq instance. However, nothing else about the ordering is specified, and it may change from environment to environment and version to version of either this package or its dependencies (hashable and 'unordered-containers').

Since: aeson-1.5.2.0

Instance details

Defined in Data.Aeson.Types.Internal

Methods

compare :: Value -> Value -> Ordering #

(<) :: Value -> Value -> Bool #

(<=) :: Value -> Value -> Bool #

(>) :: Value -> Value -> Bool #

(>=) :: Value -> Value -> Bool #

max :: Value -> Value -> Value #

min :: Value -> Value -> Value #

Ord Autoscaling 
Instance details

Defined in Amazonka.EC2.Metadata

Ord Dynamic 
Instance details

Defined in Amazonka.EC2.Metadata

Ord ElasticGpus 
Instance details

Defined in Amazonka.EC2.Metadata

Ord ElasticInference 
Instance details

Defined in Amazonka.EC2.Metadata

Ord Events 
Instance details

Defined in Amazonka.EC2.Metadata

Ord IAM 
Instance details

Defined in Amazonka.EC2.Metadata

Methods

compare :: IAM -> IAM -> Ordering #

(<) :: IAM -> IAM -> Bool #

(<=) :: IAM -> IAM -> Bool #

(>) :: IAM -> IAM -> Bool #

(>=) :: IAM -> IAM -> Bool #

max :: IAM -> IAM -> IAM #

min :: IAM -> IAM -> IAM #

Ord IdentityCredentialsEC2 
Instance details

Defined in Amazonka.EC2.Metadata

Ord Interface 
Instance details

Defined in Amazonka.EC2.Metadata

Ord Maintenance 
Instance details

Defined in Amazonka.EC2.Metadata

Ord Mapping 
Instance details

Defined in Amazonka.EC2.Metadata

Ord Metadata 
Instance details

Defined in Amazonka.EC2.Metadata

Ord Placement 
Instance details

Defined in Amazonka.EC2.Metadata

Ord Recommendations 
Instance details

Defined in Amazonka.EC2.Metadata

Ord Services 
Instance details

Defined in Amazonka.EC2.Metadata

Ord Spot 
Instance details

Defined in Amazonka.EC2.Metadata

Methods

compare :: Spot -> Spot -> Ordering #

(<) :: Spot -> Spot -> Bool #

(<=) :: Spot -> Spot -> Bool #

(>) :: Spot -> Spot -> Bool #

(>=) :: Spot -> Spot -> Bool #

max :: Spot -> Spot -> Spot #

min :: Spot -> Spot -> Spot #

Ord Tags 
Instance details

Defined in Amazonka.EC2.Metadata

Methods

compare :: Tags -> Tags -> Ordering #

(<) :: Tags -> Tags -> Bool #

(<=) :: Tags -> Tags -> Bool #

(>) :: Tags -> Tags -> Bool #

(>=) :: Tags -> Tags -> Bool #

max :: Tags -> Tags -> Tags #

min :: Tags -> Tags -> Tags #

Ord Finality 
Instance details

Defined in Amazonka.Env.Hooks

Ord LogLevel 
Instance details

Defined in Amazonka.Logger

Ord AccountFilterType 
Instance details

Defined in Amazonka.CloudFormation.Types.AccountFilterType

Ord AccountGateStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.AccountGateStatus

Ord CallAs 
Instance details

Defined in Amazonka.CloudFormation.Types.CallAs

Ord Capability 
Instance details

Defined in Amazonka.CloudFormation.Types.Capability

Ord Category 
Instance details

Defined in Amazonka.CloudFormation.Types.Category

Ord ChangeAction 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeAction

Ord ChangeSetHooksStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetHooksStatus

Ord ChangeSetStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetStatus

Ord ChangeSetType 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetType

Ord ChangeSource 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSource

Ord ChangeType 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeType

Ord DeprecatedStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.DeprecatedStatus

Ord DifferenceType 
Instance details

Defined in Amazonka.CloudFormation.Types.DifferenceType

Ord EvaluationType 
Instance details

Defined in Amazonka.CloudFormation.Types.EvaluationType

Ord ExecutionStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.ExecutionStatus

Ord HandlerErrorCode 
Instance details

Defined in Amazonka.CloudFormation.Types.HandlerErrorCode

Ord HookFailureMode 
Instance details

Defined in Amazonka.CloudFormation.Types.HookFailureMode

Ord HookInvocationPoint 
Instance details

Defined in Amazonka.CloudFormation.Types.HookInvocationPoint

Ord HookStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.HookStatus

Ord HookTargetType 
Instance details

Defined in Amazonka.CloudFormation.Types.HookTargetType

Ord IdentityProvider 
Instance details

Defined in Amazonka.CloudFormation.Types.IdentityProvider

Ord OnFailure 
Instance details

Defined in Amazonka.CloudFormation.Types.OnFailure

Ord OperationResultFilterName 
Instance details

Defined in Amazonka.CloudFormation.Types.OperationResultFilterName

Ord OperationStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.OperationStatus

Ord PermissionModels 
Instance details

Defined in Amazonka.CloudFormation.Types.PermissionModels

Ord ProvisioningType 
Instance details

Defined in Amazonka.CloudFormation.Types.ProvisioningType

Ord PublisherStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.PublisherStatus

Ord RegionConcurrencyType 
Instance details

Defined in Amazonka.CloudFormation.Types.RegionConcurrencyType

Ord RegistrationStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.RegistrationStatus

Ord RegistryType 
Instance details

Defined in Amazonka.CloudFormation.Types.RegistryType

Ord Replacement 
Instance details

Defined in Amazonka.CloudFormation.Types.Replacement

Ord RequiresRecreation 
Instance details

Defined in Amazonka.CloudFormation.Types.RequiresRecreation

Ord ResourceAttribute 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceAttribute

Ord ResourceSignalStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceSignalStatus

Ord ResourceStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceStatus

Ord StackDriftDetectionStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackDriftDetectionStatus

Ord StackDriftStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackDriftStatus

Ord StackInstanceDetailedStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstanceDetailedStatus

Ord StackInstanceFilterName 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstanceFilterName

Ord StackInstanceStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstanceStatus

Ord StackResourceDriftStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackResourceDriftStatus

Ord StackSetDriftDetectionStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetDriftDetectionStatus

Ord StackSetDriftStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetDriftStatus

Ord StackSetOperationAction 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationAction

Ord StackSetOperationResultStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationResultStatus

Ord StackSetOperationStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationStatus

Ord StackSetStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetStatus

Ord StackStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackStatus

Ord TemplateStage 
Instance details

Defined in Amazonka.CloudFormation.Types.TemplateStage

Ord ThirdPartyType 
Instance details

Defined in Amazonka.CloudFormation.Types.ThirdPartyType

Ord TypeTestsStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.TypeTestsStatus

Ord VersionBump 
Instance details

Defined in Amazonka.CloudFormation.Types.VersionBump

Ord Visibility 
Instance details

Defined in Amazonka.CloudFormation.Types.Visibility

Ord Base64 
Instance details

Defined in Amazonka.Data.Base64

Ord ChunkSize 
Instance details

Defined in Amazonka.Data.Body

Ord Abbrev 
Instance details

Defined in Amazonka.Types

Ord ErrorCode 
Instance details

Defined in Amazonka.Types

Ord ErrorMessage 
Instance details

Defined in Amazonka.Types

Ord Region 
Instance details

Defined in Amazonka.Types

Ord RequestId 
Instance details

Defined in Amazonka.Types

Ord Seconds 
Instance details

Defined in Amazonka.Types

Ord AcceleratorManufacturer 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorManufacturer

Ord AcceleratorName 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorName

Ord AcceleratorType 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorType

Ord AccountAttributeName 
Instance details

Defined in Amazonka.EC2.Types.AccountAttributeName

Ord ActivityStatus 
Instance details

Defined in Amazonka.EC2.Types.ActivityStatus

Ord AddressAttributeName 
Instance details

Defined in Amazonka.EC2.Types.AddressAttributeName

Ord AddressFamily 
Instance details

Defined in Amazonka.EC2.Types.AddressFamily

Ord AddressStatus 
Instance details

Defined in Amazonka.EC2.Types.AddressStatus

Ord AddressTransferStatus 
Instance details

Defined in Amazonka.EC2.Types.AddressTransferStatus

Ord Affinity 
Instance details

Defined in Amazonka.EC2.Types.Affinity

Ord AllocationState 
Instance details

Defined in Amazonka.EC2.Types.AllocationState

Ord AllocationStrategy 
Instance details

Defined in Amazonka.EC2.Types.AllocationStrategy

Ord AllocationType 
Instance details

Defined in Amazonka.EC2.Types.AllocationType

Ord AllowsMultipleInstanceTypes 
Instance details

Defined in Amazonka.EC2.Types.AllowsMultipleInstanceTypes

Ord AnalysisStatus 
Instance details

Defined in Amazonka.EC2.Types.AnalysisStatus

Ord ApplianceModeSupportValue 
Instance details

Defined in Amazonka.EC2.Types.ApplianceModeSupportValue

Ord ArchitectureType 
Instance details

Defined in Amazonka.EC2.Types.ArchitectureType

Ord ArchitectureValues 
Instance details

Defined in Amazonka.EC2.Types.ArchitectureValues

Ord AssociatedNetworkType 
Instance details

Defined in Amazonka.EC2.Types.AssociatedNetworkType

Ord AssociationStatusCode 
Instance details

Defined in Amazonka.EC2.Types.AssociationStatusCode

Ord AttachmentStatus 
Instance details

Defined in Amazonka.EC2.Types.AttachmentStatus

Ord AutoAcceptSharedAssociationsValue 
Instance details

Defined in Amazonka.EC2.Types.AutoAcceptSharedAssociationsValue

Ord AutoAcceptSharedAttachmentsValue 
Instance details

Defined in Amazonka.EC2.Types.AutoAcceptSharedAttachmentsValue

Ord AutoPlacement 
Instance details

Defined in Amazonka.EC2.Types.AutoPlacement

Ord AvailabilityZoneOptInStatus 
Instance details

Defined in Amazonka.EC2.Types.AvailabilityZoneOptInStatus

Ord AvailabilityZoneState 
Instance details

Defined in Amazonka.EC2.Types.AvailabilityZoneState

Ord BareMetal 
Instance details

Defined in Amazonka.EC2.Types.BareMetal

Ord BatchState 
Instance details

Defined in Amazonka.EC2.Types.BatchState

Ord BgpStatus 
Instance details

Defined in Amazonka.EC2.Types.BgpStatus

Ord BootModeType 
Instance details

Defined in Amazonka.EC2.Types.BootModeType

Ord BootModeValues 
Instance details

Defined in Amazonka.EC2.Types.BootModeValues

Ord BundleTaskState 
Instance details

Defined in Amazonka.EC2.Types.BundleTaskState

Ord BurstablePerformance 
Instance details

Defined in Amazonka.EC2.Types.BurstablePerformance

Ord ByoipCidrState 
Instance details

Defined in Amazonka.EC2.Types.ByoipCidrState

Ord CancelBatchErrorCode 
Instance details

Defined in Amazonka.EC2.Types.CancelBatchErrorCode

Ord CancelSpotInstanceRequestState 
Instance details

Defined in Amazonka.EC2.Types.CancelSpotInstanceRequestState

Ord CapacityReservationFleetState 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationFleetState

Ord CapacityReservationInstancePlatform 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationInstancePlatform

Ord CapacityReservationPreference 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationPreference

Ord CapacityReservationState 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationState

Ord CapacityReservationTenancy 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationTenancy

Ord CarrierGatewayState 
Instance details

Defined in Amazonka.EC2.Types.CarrierGatewayState

Ord ClientCertificateRevocationListStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientCertificateRevocationListStatusCode

Ord ClientVpnAuthenticationType 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnAuthenticationType

Ord ClientVpnAuthorizationRuleStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnAuthorizationRuleStatusCode

Ord ClientVpnConnectionStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnConnectionStatusCode

Ord ClientVpnEndpointAttributeStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnEndpointAttributeStatusCode

Ord ClientVpnEndpointStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnEndpointStatusCode

Ord ClientVpnRouteStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnRouteStatusCode

Ord ConnectionNotificationState 
Instance details

Defined in Amazonka.EC2.Types.ConnectionNotificationState

Ord ConnectionNotificationType 
Instance details

Defined in Amazonka.EC2.Types.ConnectionNotificationType

Ord ConnectivityType 
Instance details

Defined in Amazonka.EC2.Types.ConnectivityType

Ord ContainerFormat 
Instance details

Defined in Amazonka.EC2.Types.ContainerFormat

Ord ConversionTaskState 
Instance details

Defined in Amazonka.EC2.Types.ConversionTaskState

Ord CopyTagsFromSource 
Instance details

Defined in Amazonka.EC2.Types.CopyTagsFromSource

Ord CpuManufacturer 
Instance details

Defined in Amazonka.EC2.Types.CpuManufacturer

Ord CurrencyCodeValues 
Instance details

Defined in Amazonka.EC2.Types.CurrencyCodeValues

Ord DatafeedSubscriptionState 
Instance details

Defined in Amazonka.EC2.Types.DatafeedSubscriptionState

Ord DefaultRouteTableAssociationValue 
Instance details

Defined in Amazonka.EC2.Types.DefaultRouteTableAssociationValue

Ord DefaultRouteTablePropagationValue 
Instance details

Defined in Amazonka.EC2.Types.DefaultRouteTablePropagationValue

Ord DefaultTargetCapacityType 
Instance details

Defined in Amazonka.EC2.Types.DefaultTargetCapacityType

Ord DeleteFleetErrorCode 
Instance details

Defined in Amazonka.EC2.Types.DeleteFleetErrorCode

Ord DeleteQueuedReservedInstancesErrorCode 
Instance details

Defined in Amazonka.EC2.Types.DeleteQueuedReservedInstancesErrorCode

Ord DestinationFileFormat 
Instance details

Defined in Amazonka.EC2.Types.DestinationFileFormat

Ord DeviceTrustProviderType 
Instance details

Defined in Amazonka.EC2.Types.DeviceTrustProviderType

Ord DeviceType 
Instance details

Defined in Amazonka.EC2.Types.DeviceType

Ord DiskImageFormat 
Instance details

Defined in Amazonka.EC2.Types.DiskImageFormat

Ord DiskType 
Instance details

Defined in Amazonka.EC2.Types.DiskType

Ord DnsNameState 
Instance details

Defined in Amazonka.EC2.Types.DnsNameState

Ord DnsRecordIpType 
Instance details

Defined in Amazonka.EC2.Types.DnsRecordIpType

Ord DnsSupportValue 
Instance details

Defined in Amazonka.EC2.Types.DnsSupportValue

Ord DomainType 
Instance details

Defined in Amazonka.EC2.Types.DomainType

Ord DynamicRoutingValue 
Instance details

Defined in Amazonka.EC2.Types.DynamicRoutingValue

Ord EbsEncryptionSupport 
Instance details

Defined in Amazonka.EC2.Types.EbsEncryptionSupport

Ord EbsNvmeSupport 
Instance details

Defined in Amazonka.EC2.Types.EbsNvmeSupport

Ord EbsOptimizedSupport 
Instance details

Defined in Amazonka.EC2.Types.EbsOptimizedSupport

Ord ElasticGpuState 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpuState

Ord ElasticGpuStatus 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpuStatus

Ord EnaSupport 
Instance details

Defined in Amazonka.EC2.Types.EnaSupport

Ord EndDateType 
Instance details

Defined in Amazonka.EC2.Types.EndDateType

Ord EphemeralNvmeSupport 
Instance details

Defined in Amazonka.EC2.Types.EphemeralNvmeSupport

Ord EventCode 
Instance details

Defined in Amazonka.EC2.Types.EventCode

Ord EventType 
Instance details

Defined in Amazonka.EC2.Types.EventType

Ord ExcessCapacityTerminationPolicy 
Instance details

Defined in Amazonka.EC2.Types.ExcessCapacityTerminationPolicy

Ord ExportEnvironment 
Instance details

Defined in Amazonka.EC2.Types.ExportEnvironment

Ord ExportTaskState 
Instance details

Defined in Amazonka.EC2.Types.ExportTaskState

Ord FastLaunchResourceType 
Instance details

Defined in Amazonka.EC2.Types.FastLaunchResourceType

Ord FastLaunchStateCode 
Instance details

Defined in Amazonka.EC2.Types.FastLaunchStateCode

Ord FastSnapshotRestoreStateCode 
Instance details

Defined in Amazonka.EC2.Types.FastSnapshotRestoreStateCode

Ord FindingsFound 
Instance details

Defined in Amazonka.EC2.Types.FindingsFound

Ord FleetActivityStatus 
Instance details

Defined in Amazonka.EC2.Types.FleetActivityStatus

Ord FleetCapacityReservationTenancy 
Instance details

Defined in Amazonka.EC2.Types.FleetCapacityReservationTenancy

Ord FleetCapacityReservationUsageStrategy 
Instance details

Defined in Amazonka.EC2.Types.FleetCapacityReservationUsageStrategy

Ord FleetEventType 
Instance details

Defined in Amazonka.EC2.Types.FleetEventType

Ord FleetExcessCapacityTerminationPolicy 
Instance details

Defined in Amazonka.EC2.Types.FleetExcessCapacityTerminationPolicy

Ord FleetInstanceMatchCriteria 
Instance details

Defined in Amazonka.EC2.Types.FleetInstanceMatchCriteria

Ord FleetOnDemandAllocationStrategy 
Instance details

Defined in Amazonka.EC2.Types.FleetOnDemandAllocationStrategy

Ord FleetReplacementStrategy 
Instance details

Defined in Amazonka.EC2.Types.FleetReplacementStrategy

Ord FleetStateCode 
Instance details

Defined in Amazonka.EC2.Types.FleetStateCode

Ord FleetType 
Instance details

Defined in Amazonka.EC2.Types.FleetType

Ord FlowLogsResourceType 
Instance details

Defined in Amazonka.EC2.Types.FlowLogsResourceType

Ord FpgaImageAttributeName 
Instance details

Defined in Amazonka.EC2.Types.FpgaImageAttributeName

Ord FpgaImageStateCode 
Instance details

Defined in Amazonka.EC2.Types.FpgaImageStateCode

Ord GatewayAssociationState 
Instance details

Defined in Amazonka.EC2.Types.GatewayAssociationState

Ord GatewayType 
Instance details

Defined in Amazonka.EC2.Types.GatewayType

Ord HostRecovery 
Instance details

Defined in Amazonka.EC2.Types.HostRecovery

Ord HostTenancy 
Instance details

Defined in Amazonka.EC2.Types.HostTenancy

Ord HostnameType 
Instance details

Defined in Amazonka.EC2.Types.HostnameType

Ord HttpTokensState 
Instance details

Defined in Amazonka.EC2.Types.HttpTokensState

Ord HypervisorType 
Instance details

Defined in Amazonka.EC2.Types.HypervisorType

Ord IamInstanceProfileAssociationState 
Instance details

Defined in Amazonka.EC2.Types.IamInstanceProfileAssociationState

Ord Igmpv2SupportValue 
Instance details

Defined in Amazonka.EC2.Types.Igmpv2SupportValue

Ord ImageAttributeName 
Instance details

Defined in Amazonka.EC2.Types.ImageAttributeName

Ord ImageState 
Instance details

Defined in Amazonka.EC2.Types.ImageState

Ord ImageTypeValues 
Instance details

Defined in Amazonka.EC2.Types.ImageTypeValues

Ord ImdsSupportValues 
Instance details

Defined in Amazonka.EC2.Types.ImdsSupportValues

Ord InstanceAttributeName 
Instance details

Defined in Amazonka.EC2.Types.InstanceAttributeName

Ord InstanceAutoRecoveryState 
Instance details

Defined in Amazonka.EC2.Types.InstanceAutoRecoveryState

Ord InstanceEventWindowState 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindowState

Ord InstanceGeneration 
Instance details

Defined in Amazonka.EC2.Types.InstanceGeneration

Ord InstanceHealthStatus 
Instance details

Defined in Amazonka.EC2.Types.InstanceHealthStatus

Ord InstanceInterruptionBehavior 
Instance details

Defined in Amazonka.EC2.Types.InstanceInterruptionBehavior

Ord InstanceLifecycle 
Instance details

Defined in Amazonka.EC2.Types.InstanceLifecycle

Ord InstanceLifecycleType 
Instance details

Defined in Amazonka.EC2.Types.InstanceLifecycleType

Ord InstanceMatchCriteria 
Instance details

Defined in Amazonka.EC2.Types.InstanceMatchCriteria

Ord InstanceMetadataEndpointState 
Instance details

Defined in Amazonka.EC2.Types.InstanceMetadataEndpointState

Ord InstanceMetadataOptionsState 
Instance details

Defined in Amazonka.EC2.Types.InstanceMetadataOptionsState

Ord InstanceMetadataProtocolState 
Instance details

Defined in Amazonka.EC2.Types.InstanceMetadataProtocolState

Ord InstanceMetadataTagsState 
Instance details

Defined in Amazonka.EC2.Types.InstanceMetadataTagsState

Ord InstanceStateName 
Instance details

Defined in Amazonka.EC2.Types.InstanceStateName

Ord InstanceStorageEncryptionSupport 
Instance details

Defined in Amazonka.EC2.Types.InstanceStorageEncryptionSupport

Ord InstanceType 
Instance details

Defined in Amazonka.EC2.Types.InstanceType

Ord InstanceTypeHypervisor 
Instance details

Defined in Amazonka.EC2.Types.InstanceTypeHypervisor

Ord InterfacePermissionType 
Instance details

Defined in Amazonka.EC2.Types.InterfacePermissionType

Ord InterfaceProtocolType 
Instance details

Defined in Amazonka.EC2.Types.InterfaceProtocolType

Ord IpAddressType 
Instance details

Defined in Amazonka.EC2.Types.IpAddressType

Ord IpamAddressHistoryResourceType 
Instance details

Defined in Amazonka.EC2.Types.IpamAddressHistoryResourceType

Ord IpamComplianceStatus 
Instance details

Defined in Amazonka.EC2.Types.IpamComplianceStatus

Ord IpamManagementState 
Instance details

Defined in Amazonka.EC2.Types.IpamManagementState

Ord IpamOverlapStatus 
Instance details

Defined in Amazonka.EC2.Types.IpamOverlapStatus

Ord IpamPoolAllocationResourceType 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolAllocationResourceType

Ord IpamPoolAwsService 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolAwsService

Ord IpamPoolCidrFailureCode 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolCidrFailureCode

Ord IpamPoolCidrState 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolCidrState

Ord IpamPoolState 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolState

Ord IpamResourceType 
Instance details

Defined in Amazonka.EC2.Types.IpamResourceType

Ord IpamScopeState 
Instance details

Defined in Amazonka.EC2.Types.IpamScopeState

Ord IpamScopeType 
Instance details

Defined in Amazonka.EC2.Types.IpamScopeType

Ord IpamState 
Instance details

Defined in Amazonka.EC2.Types.IpamState

Ord Ipv6SupportValue 
Instance details

Defined in Amazonka.EC2.Types.Ipv6SupportValue

Ord KeyFormat 
Instance details

Defined in Amazonka.EC2.Types.KeyFormat

Ord KeyType 
Instance details

Defined in Amazonka.EC2.Types.KeyType

Ord LaunchTemplateAutoRecoveryState 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateAutoRecoveryState

Ord LaunchTemplateErrorCode 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateErrorCode

Ord LaunchTemplateHttpTokensState 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateHttpTokensState

Ord LaunchTemplateInstanceMetadataEndpointState 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMetadataEndpointState

Ord LaunchTemplateInstanceMetadataOptionsState 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMetadataOptionsState

Ord LaunchTemplateInstanceMetadataProtocolIpv6 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMetadataProtocolIpv6

Ord LaunchTemplateInstanceMetadataTagsState 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMetadataTagsState

Ord ListingState 
Instance details

Defined in Amazonka.EC2.Types.ListingState

Ord ListingStatus 
Instance details

Defined in Amazonka.EC2.Types.ListingStatus

Ord LocalGatewayRouteState 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRouteState

Ord LocalGatewayRouteTableMode 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRouteTableMode

Ord LocalGatewayRouteType 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRouteType

Ord LocalStorage 
Instance details

Defined in Amazonka.EC2.Types.LocalStorage

Ord LocalStorageType 
Instance details

Defined in Amazonka.EC2.Types.LocalStorageType

Ord LocationType 
Instance details

Defined in Amazonka.EC2.Types.LocationType

Ord LogDestinationType 
Instance details

Defined in Amazonka.EC2.Types.LogDestinationType

Ord MarketType 
Instance details

Defined in Amazonka.EC2.Types.MarketType

Ord MembershipType 
Instance details

Defined in Amazonka.EC2.Types.MembershipType

Ord MetricType 
Instance details

Defined in Amazonka.EC2.Types.MetricType

Ord ModifyAvailabilityZoneOptInStatus 
Instance details

Defined in Amazonka.EC2.Types.ModifyAvailabilityZoneOptInStatus

Ord MonitoringState 
Instance details

Defined in Amazonka.EC2.Types.MonitoringState

Ord MoveStatus 
Instance details

Defined in Amazonka.EC2.Types.MoveStatus

Ord MulticastSupportValue 
Instance details

Defined in Amazonka.EC2.Types.MulticastSupportValue

Ord NatGatewayState 
Instance details

Defined in Amazonka.EC2.Types.NatGatewayState

Ord NetworkInterfaceAttribute 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceAttribute

Ord NetworkInterfaceCreationType 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceCreationType

Ord NetworkInterfacePermissionStateCode 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfacePermissionStateCode

Ord NetworkInterfaceStatus 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceStatus

Ord NetworkInterfaceType 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceType

Ord OfferingClassType 
Instance details

Defined in Amazonka.EC2.Types.OfferingClassType

Ord OfferingTypeValues 
Instance details

Defined in Amazonka.EC2.Types.OfferingTypeValues

Ord OnDemandAllocationStrategy 
Instance details

Defined in Amazonka.EC2.Types.OnDemandAllocationStrategy

Ord OperationType 
Instance details

Defined in Amazonka.EC2.Types.OperationType

Ord PartitionLoadFrequency 
Instance details

Defined in Amazonka.EC2.Types.PartitionLoadFrequency

Ord PayerResponsibility 
Instance details

Defined in Amazonka.EC2.Types.PayerResponsibility

Ord PaymentOption 
Instance details

Defined in Amazonka.EC2.Types.PaymentOption

Ord PeriodType 
Instance details

Defined in Amazonka.EC2.Types.PeriodType

Ord PermissionGroup 
Instance details

Defined in Amazonka.EC2.Types.PermissionGroup

Ord PlacementGroupState 
Instance details

Defined in Amazonka.EC2.Types.PlacementGroupState

Ord PlacementGroupStrategy 
Instance details

Defined in Amazonka.EC2.Types.PlacementGroupStrategy

Ord PlacementStrategy 
Instance details

Defined in Amazonka.EC2.Types.PlacementStrategy

Ord PlatformValues 
Instance details

Defined in Amazonka.EC2.Types.PlatformValues

Ord PrefixListState 
Instance details

Defined in Amazonka.EC2.Types.PrefixListState

Ord PrincipalType 
Instance details

Defined in Amazonka.EC2.Types.PrincipalType

Ord ProductCodeValues 
Instance details

Defined in Amazonka.EC2.Types.ProductCodeValues

Ord Protocol 
Instance details

Defined in Amazonka.EC2.Types.Protocol

Ord ProtocolValue 
Instance details

Defined in Amazonka.EC2.Types.ProtocolValue

Ord RIProductDescription 
Instance details

Defined in Amazonka.EC2.Types.RIProductDescription

Ord RecurringChargeFrequency 
Instance details

Defined in Amazonka.EC2.Types.RecurringChargeFrequency

Ord ReplaceRootVolumeTaskState 
Instance details

Defined in Amazonka.EC2.Types.ReplaceRootVolumeTaskState

Ord ReplacementStrategy 
Instance details

Defined in Amazonka.EC2.Types.ReplacementStrategy

Ord ReportInstanceReasonCodes 
Instance details

Defined in Amazonka.EC2.Types.ReportInstanceReasonCodes

Ord ReportStatusType 
Instance details

Defined in Amazonka.EC2.Types.ReportStatusType

Ord ReservationState 
Instance details

Defined in Amazonka.EC2.Types.ReservationState

Ord ReservedInstanceState 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstanceState

Ord ResetFpgaImageAttributeName 
Instance details

Defined in Amazonka.EC2.Types.ResetFpgaImageAttributeName

Ord ResetImageAttributeName 
Instance details

Defined in Amazonka.EC2.Types.ResetImageAttributeName

Ord ResourceType 
Instance details

Defined in Amazonka.EC2.Types.ResourceType

Ord RootDeviceType 
Instance details

Defined in Amazonka.EC2.Types.RootDeviceType

Ord RouteOrigin 
Instance details

Defined in Amazonka.EC2.Types.RouteOrigin

Ord RouteState 
Instance details

Defined in Amazonka.EC2.Types.RouteState

Ord RouteTableAssociationStateCode 
Instance details

Defined in Amazonka.EC2.Types.RouteTableAssociationStateCode

Ord RuleAction 
Instance details

Defined in Amazonka.EC2.Types.RuleAction

Ord Scope 
Instance details

Defined in Amazonka.EC2.Types.Scope

Methods

compare :: Scope -> Scope -> Ordering #

(<) :: Scope -> Scope -> Bool #

(<=) :: Scope -> Scope -> Bool #

(>) :: Scope -> Scope -> Bool #

(>=) :: Scope -> Scope -> Bool #

max :: Scope -> Scope -> Scope #

min :: Scope -> Scope -> Scope #

Ord SelfServicePortal 
Instance details

Defined in Amazonka.EC2.Types.SelfServicePortal

Ord ServiceConnectivityType 
Instance details

Defined in Amazonka.EC2.Types.ServiceConnectivityType

Ord ServiceState 
Instance details

Defined in Amazonka.EC2.Types.ServiceState

Ord ServiceType 
Instance details

Defined in Amazonka.EC2.Types.ServiceType

Ord ShutdownBehavior 
Instance details

Defined in Amazonka.EC2.Types.ShutdownBehavior

Ord SnapshotAttributeName 
Instance details

Defined in Amazonka.EC2.Types.SnapshotAttributeName

Ord SnapshotState 
Instance details

Defined in Amazonka.EC2.Types.SnapshotState

Ord SpotAllocationStrategy 
Instance details

Defined in Amazonka.EC2.Types.SpotAllocationStrategy

Ord SpotInstanceInterruptionBehavior 
Instance details

Defined in Amazonka.EC2.Types.SpotInstanceInterruptionBehavior

Ord SpotInstanceState 
Instance details

Defined in Amazonka.EC2.Types.SpotInstanceState

Ord SpotInstanceType 
Instance details

Defined in Amazonka.EC2.Types.SpotInstanceType

Ord SpreadLevel 
Instance details

Defined in Amazonka.EC2.Types.SpreadLevel

Ord State 
Instance details

Defined in Amazonka.EC2.Types.State

Methods

compare :: State -> State -> Ordering #

(<) :: State -> State -> Bool #

(<=) :: State -> State -> Bool #

(>) :: State -> State -> Bool #

(>=) :: State -> State -> Bool #

max :: State -> State -> State #

min :: State -> State -> State #

Ord StaticSourcesSupportValue 
Instance details

Defined in Amazonka.EC2.Types.StaticSourcesSupportValue

Ord StatisticType 
Instance details

Defined in Amazonka.EC2.Types.StatisticType

Ord StatusName 
Instance details

Defined in Amazonka.EC2.Types.StatusName

Ord StatusType 
Instance details

Defined in Amazonka.EC2.Types.StatusType

Ord StorageTier 
Instance details

Defined in Amazonka.EC2.Types.StorageTier

Ord SubnetCidrBlockStateCode 
Instance details

Defined in Amazonka.EC2.Types.SubnetCidrBlockStateCode

Ord SubnetCidrReservationType 
Instance details

Defined in Amazonka.EC2.Types.SubnetCidrReservationType

Ord SubnetState 
Instance details

Defined in Amazonka.EC2.Types.SubnetState

Ord SummaryStatus 
Instance details

Defined in Amazonka.EC2.Types.SummaryStatus

Ord TargetCapacityUnitType 
Instance details

Defined in Amazonka.EC2.Types.TargetCapacityUnitType

Ord TargetStorageTier 
Instance details

Defined in Amazonka.EC2.Types.TargetStorageTier

Ord TelemetryStatus 
Instance details

Defined in Amazonka.EC2.Types.TelemetryStatus

Ord Tenancy 
Instance details

Defined in Amazonka.EC2.Types.Tenancy

Ord TieringOperationStatus 
Instance details

Defined in Amazonka.EC2.Types.TieringOperationStatus

Ord TpmSupportValues 
Instance details

Defined in Amazonka.EC2.Types.TpmSupportValues

Ord TrafficDirection 
Instance details

Defined in Amazonka.EC2.Types.TrafficDirection

Ord TrafficMirrorFilterRuleField 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorFilterRuleField

Ord TrafficMirrorNetworkService 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorNetworkService

Ord TrafficMirrorRuleAction 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorRuleAction

Ord TrafficMirrorSessionField 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorSessionField

Ord TrafficMirrorTargetType 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorTargetType

Ord TrafficType 
Instance details

Defined in Amazonka.EC2.Types.TrafficType

Ord TransitGatewayAssociationState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAssociationState

Ord TransitGatewayAttachmentResourceType 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAttachmentResourceType

Ord TransitGatewayAttachmentState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAttachmentState

Ord TransitGatewayConnectPeerState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayConnectPeerState

Ord TransitGatewayMulitcastDomainAssociationState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulitcastDomainAssociationState

Ord TransitGatewayMulticastDomainState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastDomainState

Ord TransitGatewayPolicyTableState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPolicyTableState

Ord TransitGatewayPrefixListReferenceState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPrefixListReferenceState

Ord TransitGatewayPropagationState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPropagationState

Ord TransitGatewayRouteState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteState

Ord TransitGatewayRouteTableAnnouncementDirection 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTableAnnouncementDirection

Ord TransitGatewayRouteTableAnnouncementState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTableAnnouncementState

Ord TransitGatewayRouteTableState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTableState

Ord TransitGatewayRouteType 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteType

Ord TransitGatewayState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayState

Ord TransportProtocol 
Instance details

Defined in Amazonka.EC2.Types.TransportProtocol

Ord TrustProviderType 
Instance details

Defined in Amazonka.EC2.Types.TrustProviderType

Ord TunnelInsideIpVersion 
Instance details

Defined in Amazonka.EC2.Types.TunnelInsideIpVersion

Ord UnlimitedSupportedInstanceFamily 
Instance details

Defined in Amazonka.EC2.Types.UnlimitedSupportedInstanceFamily

Ord UnsuccessfulInstanceCreditSpecificationErrorCode 
Instance details

Defined in Amazonka.EC2.Types.UnsuccessfulInstanceCreditSpecificationErrorCode

Ord UsageClassType 
Instance details

Defined in Amazonka.EC2.Types.UsageClassType

Ord UserTrustProviderType 
Instance details

Defined in Amazonka.EC2.Types.UserTrustProviderType

Ord VerifiedAccessEndpointAttachmentType 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointAttachmentType

Ord VerifiedAccessEndpointProtocol 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointProtocol

Ord VerifiedAccessEndpointStatusCode 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointStatusCode

Ord VerifiedAccessEndpointType 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointType

Ord VerifiedAccessLogDeliveryStatusCode 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogDeliveryStatusCode

Ord VirtualizationType 
Instance details

Defined in Amazonka.EC2.Types.VirtualizationType

Ord VolumeAttachmentState 
Instance details

Defined in Amazonka.EC2.Types.VolumeAttachmentState

Ord VolumeAttributeName 
Instance details

Defined in Amazonka.EC2.Types.VolumeAttributeName

Ord VolumeModificationState 
Instance details

Defined in Amazonka.EC2.Types.VolumeModificationState

Ord VolumeState 
Instance details

Defined in Amazonka.EC2.Types.VolumeState

Ord VolumeStatusInfoStatus 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusInfoStatus

Ord VolumeStatusName 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusName

Ord VolumeType 
Instance details

Defined in Amazonka.EC2.Types.VolumeType

Ord VpcAttributeName 
Instance details

Defined in Amazonka.EC2.Types.VpcAttributeName

Ord VpcCidrBlockStateCode 
Instance details

Defined in Amazonka.EC2.Types.VpcCidrBlockStateCode

Ord VpcEndpointType 
Instance details

Defined in Amazonka.EC2.Types.VpcEndpointType

Ord VpcPeeringConnectionStateReasonCode 
Instance details

Defined in Amazonka.EC2.Types.VpcPeeringConnectionStateReasonCode

Ord VpcState 
Instance details

Defined in Amazonka.EC2.Types.VpcState

Ord VpcTenancy 
Instance details

Defined in Amazonka.EC2.Types.VpcTenancy

Ord VpnEcmpSupportValue 
Instance details

Defined in Amazonka.EC2.Types.VpnEcmpSupportValue

Ord VpnProtocol 
Instance details

Defined in Amazonka.EC2.Types.VpnProtocol

Ord VpnState 
Instance details

Defined in Amazonka.EC2.Types.VpnState

Ord VpnStaticRouteSource 
Instance details

Defined in Amazonka.EC2.Types.VpnStaticRouteSource

Ord WeekDay 
Instance details

Defined in Amazonka.EC2.Types.WeekDay

Ord Architecture 
Instance details

Defined in Amazonka.Lambda.Types.Architecture

Ord CodeSigningPolicy 
Instance details

Defined in Amazonka.Lambda.Types.CodeSigningPolicy

Ord EndPointType 
Instance details

Defined in Amazonka.Lambda.Types.EndPointType

Ord EventSourcePosition 
Instance details

Defined in Amazonka.Lambda.Types.EventSourcePosition

Ord FunctionResponseType 
Instance details

Defined in Amazonka.Lambda.Types.FunctionResponseType

Ord FunctionUrlAuthType 
Instance details

Defined in Amazonka.Lambda.Types.FunctionUrlAuthType

Ord FunctionVersion 
Instance details

Defined in Amazonka.Lambda.Types.FunctionVersion

Ord InvocationType 
Instance details

Defined in Amazonka.Lambda.Types.InvocationType

Ord LastUpdateStatus 
Instance details

Defined in Amazonka.Lambda.Types.LastUpdateStatus

Ord LastUpdateStatusReasonCode 
Instance details

Defined in Amazonka.Lambda.Types.LastUpdateStatusReasonCode

Ord LogType 
Instance details

Defined in Amazonka.Lambda.Types.LogType

Ord PackageType 
Instance details

Defined in Amazonka.Lambda.Types.PackageType

Ord ProvisionedConcurrencyStatusEnum 
Instance details

Defined in Amazonka.Lambda.Types.ProvisionedConcurrencyStatusEnum

Ord Runtime 
Instance details

Defined in Amazonka.Lambda.Types.Runtime

Ord SnapStartApplyOn 
Instance details

Defined in Amazonka.Lambda.Types.SnapStartApplyOn

Ord SnapStartOptimizationStatus 
Instance details

Defined in Amazonka.Lambda.Types.SnapStartOptimizationStatus

Ord SourceAccessType 
Instance details

Defined in Amazonka.Lambda.Types.SourceAccessType

Ord State 
Instance details

Defined in Amazonka.Lambda.Types.State

Methods

compare :: State -> State -> Ordering #

(<) :: State -> State -> Bool #

(<=) :: State -> State -> Bool #

(>) :: State -> State -> Bool #

(>=) :: State -> State -> Bool #

max :: State -> State -> State #

min :: State -> State -> State #

Ord StateReasonCode 
Instance details

Defined in Amazonka.Lambda.Types.StateReasonCode

Ord TracingMode 
Instance details

Defined in Amazonka.Lambda.Types.TracingMode

Ord Pos 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

compare :: Pos -> Pos -> Ordering #

(<) :: Pos -> Pos -> Bool #

(<=) :: Pos -> Pos -> Bool #

(>) :: Pos -> Pos -> Bool #

(>=) :: Pos -> Pos -> Bool #

max :: Pos -> Pos -> Pos #

min :: Pos -> Pos -> Pos #

Ord All

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

compare :: All -> All -> Ordering #

(<) :: All -> All -> Bool #

(<=) :: All -> All -> Bool #

(>) :: All -> All -> Bool #

(>=) :: All -> All -> Bool #

max :: All -> All -> All #

min :: All -> All -> All #

Ord Any

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

compare :: Any -> Any -> Ordering #

(<) :: Any -> Any -> Bool #

(<=) :: Any -> Any -> Bool #

(>) :: Any -> Any -> Bool #

(>=) :: Any -> Any -> Bool #

max :: Any -> Any -> Any #

min :: Any -> Any -> Any #

Ord SomeTypeRep 
Instance details

Defined in Data.Typeable.Internal

Ord Version

Since: base-2.1

Instance details

Defined in Data.Version

Ord Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Methods

compare :: Void -> Void -> Ordering #

(<) :: Void -> Void -> Bool #

(<=) :: Void -> Void -> Bool #

(>) :: Void -> Void -> Bool #

(>=) :: Void -> Void -> Bool #

max :: Void -> Void -> Void #

min :: Void -> Void -> Void #

Ord CBool 
Instance details

Defined in Foreign.C.Types

Methods

compare :: CBool -> CBool -> Ordering #

(<) :: CBool -> CBool -> Bool #

(<=) :: CBool -> CBool -> Bool #

(>) :: CBool -> CBool -> Bool #

(>=) :: CBool -> CBool -> Bool #

max :: CBool -> CBool -> CBool #

min :: CBool -> CBool -> CBool #

Ord CChar 
Instance details

Defined in Foreign.C.Types

Methods

compare :: CChar -> CChar -> Ordering #

(<) :: CChar -> CChar -> Bool #

(<=) :: CChar -> CChar -> Bool #

(>) :: CChar -> CChar -> Bool #

(>=) :: CChar -> CChar -> Bool #

max :: CChar -> CChar -> CChar #

min :: CChar -> CChar -> CChar #

Ord CClock 
Instance details

Defined in Foreign.C.Types

Ord CDouble 
Instance details

Defined in Foreign.C.Types

Ord CFloat 
Instance details

Defined in Foreign.C.Types

Ord CInt 
Instance details

Defined in Foreign.C.Types

Methods

compare :: CInt -> CInt -> Ordering #

(<) :: CInt -> CInt -> Bool #

(<=) :: CInt -> CInt -> Bool #

(>) :: CInt -> CInt -> Bool #

(>=) :: CInt -> CInt -> Bool #

max :: CInt -> CInt -> CInt #

min :: CInt -> CInt -> CInt #

Ord CIntMax 
Instance details

Defined in Foreign.C.Types

Ord CIntPtr 
Instance details

Defined in Foreign.C.Types

Ord CLLong 
Instance details

Defined in Foreign.C.Types

Ord CLong 
Instance details

Defined in Foreign.C.Types

Methods

compare :: CLong -> CLong -> Ordering #

(<) :: CLong -> CLong -> Bool #

(<=) :: CLong -> CLong -> Bool #

(>) :: CLong -> CLong -> Bool #

(>=) :: CLong -> CLong -> Bool #

max :: CLong -> CLong -> CLong #

min :: CLong -> CLong -> CLong #

Ord CPtrdiff 
Instance details

Defined in Foreign.C.Types

Ord CSChar 
Instance details

Defined in Foreign.C.Types

Ord CSUSeconds 
Instance details

Defined in Foreign.C.Types

Ord CShort 
Instance details

Defined in Foreign.C.Types

Ord CSigAtomic 
Instance details

Defined in Foreign.C.Types

Ord CSize 
Instance details

Defined in Foreign.C.Types

Methods

compare :: CSize -> CSize -> Ordering #

(<) :: CSize -> CSize -> Bool #

(<=) :: CSize -> CSize -> Bool #

(>) :: CSize -> CSize -> Bool #

(>=) :: CSize -> CSize -> Bool #

max :: CSize -> CSize -> CSize #

min :: CSize -> CSize -> CSize #

Ord CTime 
Instance details

Defined in Foreign.C.Types

Methods

compare :: CTime -> CTime -> Ordering #

(<) :: CTime -> CTime -> Bool #

(<=) :: CTime -> CTime -> Bool #

(>) :: CTime -> CTime -> Bool #

(>=) :: CTime -> CTime -> Bool #

max :: CTime -> CTime -> CTime #

min :: CTime -> CTime -> CTime #

Ord CUChar 
Instance details

Defined in Foreign.C.Types

Ord CUInt 
Instance details

Defined in Foreign.C.Types

Methods

compare :: CUInt -> CUInt -> Ordering #

(<) :: CUInt -> CUInt -> Bool #

(<=) :: CUInt -> CUInt -> Bool #

(>) :: CUInt -> CUInt -> Bool #

(>=) :: CUInt -> CUInt -> Bool #

max :: CUInt -> CUInt -> CUInt #

min :: CUInt -> CUInt -> CUInt #

Ord CUIntMax 
Instance details

Defined in Foreign.C.Types

Ord CUIntPtr 
Instance details

Defined in Foreign.C.Types

Ord CULLong 
Instance details

Defined in Foreign.C.Types

Ord CULong 
Instance details

Defined in Foreign.C.Types

Ord CUSeconds 
Instance details

Defined in Foreign.C.Types

Ord CUShort 
Instance details

Defined in Foreign.C.Types

Ord CWchar 
Instance details

Defined in Foreign.C.Types

Ord BlockReason

Since: base-4.3.0.0

Instance details

Defined in GHC.Conc.Sync

Ord ThreadId

Since: base-4.2.0.0

Instance details

Defined in GHC.Conc.Sync

Ord ThreadStatus

Since: base-4.3.0.0

Instance details

Defined in GHC.Conc.Sync

Ord ArithException

Since: base-3.0

Instance details

Defined in GHC.Exception.Type

Ord Fingerprint

Since: base-4.4.0.0

Instance details

Defined in GHC.Fingerprint.Type

Ord Associativity

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Ord DecidedStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Ord Fixity

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Ord SourceStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Ord SourceUnpackedness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Ord SeekMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Device

Ord ArrayException

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Exception

Ord AsyncException

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Exception

Ord ExitCode 
Instance details

Defined in GHC.IO.Exception

Ord BufferMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Handle.Types

Ord Newline

Since: base-4.3.0.0

Instance details

Defined in GHC.IO.Handle.Types

Ord NewlineMode

Since: base-4.3.0.0

Instance details

Defined in GHC.IO.Handle.Types

Ord IOMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.IOMode

Ord Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

compare :: Int16 -> Int16 -> Ordering #

(<) :: Int16 -> Int16 -> Bool #

(<=) :: Int16 -> Int16 -> Bool #

(>) :: Int16 -> Int16 -> Bool #

(>=) :: Int16 -> Int16 -> Bool #

max :: Int16 -> Int16 -> Int16 #

min :: Int16 -> Int16 -> Int16 #

Ord Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

compare :: Int32 -> Int32 -> Ordering #

(<) :: Int32 -> Int32 -> Bool #

(<=) :: Int32 -> Int32 -> Bool #

(>) :: Int32 -> Int32 -> Bool #

(>=) :: Int32 -> Int32 -> Bool #

max :: Int32 -> Int32 -> Int32 #

min :: Int32 -> Int32 -> Int32 #

Ord Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

compare :: Int64 -> Int64 -> Ordering #

(<) :: Int64 -> Int64 -> Bool #

(<=) :: Int64 -> Int64 -> Bool #

(>) :: Int64 -> Int64 -> Bool #

(>=) :: Int64 -> Int64 -> Bool #

max :: Int64 -> Int64 -> Int64 #

min :: Int64 -> Int64 -> Int64 #

Ord Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

compare :: Int8 -> Int8 -> Ordering #

(<) :: Int8 -> Int8 -> Bool #

(<=) :: Int8 -> Int8 -> Bool #

(>) :: Int8 -> Int8 -> Bool #

(>=) :: Int8 -> Int8 -> Bool #

max :: Int8 -> Int8 -> Int8 #

min :: Int8 -> Int8 -> Int8 #

Ord SomeChar 
Instance details

Defined in GHC.TypeLits

Ord SomeSymbol

Since: base-4.7.0.0

Instance details

Defined in GHC.TypeLits

Ord SomeNat

Since: base-4.7.0.0

Instance details

Defined in GHC.TypeNats

Ord GeneralCategory

Since: base-2.1

Instance details

Defined in GHC.Unicode

Ord Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Ord Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Ord Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Ord Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Methods

compare :: Word8 -> Word8 -> Ordering #

(<) :: Word8 -> Word8 -> Bool #

(<=) :: Word8 -> Word8 -> Bool #

(>) :: Word8 -> Word8 -> Bool #

(>=) :: Word8 -> Word8 -> Bool #

max :: Word8 -> Word8 -> Word8 #

min :: Word8 -> Word8 -> Word8 #

Ord CBlkCnt 
Instance details

Defined in System.Posix.Types

Ord CBlkSize 
Instance details

Defined in System.Posix.Types

Ord CCc 
Instance details

Defined in System.Posix.Types

Methods

compare :: CCc -> CCc -> Ordering #

(<) :: CCc -> CCc -> Bool #

(<=) :: CCc -> CCc -> Bool #

(>) :: CCc -> CCc -> Bool #

(>=) :: CCc -> CCc -> Bool #

max :: CCc -> CCc -> CCc #

min :: CCc -> CCc -> CCc #

Ord CClockId 
Instance details

Defined in System.Posix.Types

Ord CDev 
Instance details

Defined in System.Posix.Types

Methods

compare :: CDev -> CDev -> Ordering #

(<) :: CDev -> CDev -> Bool #

(<=) :: CDev -> CDev -> Bool #

(>) :: CDev -> CDev -> Bool #

(>=) :: CDev -> CDev -> Bool #

max :: CDev -> CDev -> CDev #

min :: CDev -> CDev -> CDev #

Ord CFsBlkCnt 
Instance details

Defined in System.Posix.Types

Ord CFsFilCnt 
Instance details

Defined in System.Posix.Types

Ord CGid 
Instance details

Defined in System.Posix.Types

Methods

compare :: CGid -> CGid -> Ordering #

(<) :: CGid -> CGid -> Bool #

(<=) :: CGid -> CGid -> Bool #

(>) :: CGid -> CGid -> Bool #

(>=) :: CGid -> CGid -> Bool #

max :: CGid -> CGid -> CGid #

min :: CGid -> CGid -> CGid #

Ord CId 
Instance details

Defined in System.Posix.Types

Methods

compare :: CId -> CId -> Ordering #

(<) :: CId -> CId -> Bool #

(<=) :: CId -> CId -> Bool #

(>) :: CId -> CId -> Bool #

(>=) :: CId -> CId -> Bool #

max :: CId -> CId -> CId #

min :: CId -> CId -> CId #

Ord CIno 
Instance details

Defined in System.Posix.Types

Methods

compare :: CIno -> CIno -> Ordering #

(<) :: CIno -> CIno -> Bool #

(<=) :: CIno -> CIno -> Bool #

(>) :: CIno -> CIno -> Bool #

(>=) :: CIno -> CIno -> Bool #

max :: CIno -> CIno -> CIno #

min :: CIno -> CIno -> CIno #

Ord CKey 
Instance details

Defined in System.Posix.Types

Methods

compare :: CKey -> CKey -> Ordering #

(<) :: CKey -> CKey -> Bool #

(<=) :: CKey -> CKey -> Bool #

(>) :: CKey -> CKey -> Bool #

(>=) :: CKey -> CKey -> Bool #

max :: CKey -> CKey -> CKey #

min :: CKey -> CKey -> CKey #

Ord CMode 
Instance details

Defined in System.Posix.Types

Methods

compare :: CMode -> CMode -> Ordering #

(<) :: CMode -> CMode -> Bool #

(<=) :: CMode -> CMode -> Bool #

(>) :: CMode -> CMode -> Bool #

(>=) :: CMode -> CMode -> Bool #

max :: CMode -> CMode -> CMode #

min :: CMode -> CMode -> CMode #

Ord CNfds 
Instance details

Defined in System.Posix.Types

Methods

compare :: CNfds -> CNfds -> Ordering #

(<) :: CNfds -> CNfds -> Bool #

(<=) :: CNfds -> CNfds -> Bool #

(>) :: CNfds -> CNfds -> Bool #

(>=) :: CNfds -> CNfds -> Bool #

max :: CNfds -> CNfds -> CNfds #

min :: CNfds -> CNfds -> CNfds #

Ord CNlink 
Instance details

Defined in System.Posix.Types

Ord COff 
Instance details

Defined in System.Posix.Types

Methods

compare :: COff -> COff -> Ordering #

(<) :: COff -> COff -> Bool #

(<=) :: COff -> COff -> Bool #

(>) :: COff -> COff -> Bool #

(>=) :: COff -> COff -> Bool #

max :: COff -> COff -> COff #

min :: COff -> COff -> COff #

Ord CPid 
Instance details

Defined in System.Posix.Types

Methods

compare :: CPid -> CPid -> Ordering #

(<) :: CPid -> CPid -> Bool #

(<=) :: CPid -> CPid -> Bool #

(>) :: CPid -> CPid -> Bool #

(>=) :: CPid -> CPid -> Bool #

max :: CPid -> CPid -> CPid #

min :: CPid -> CPid -> CPid #

Ord CRLim 
Instance details

Defined in System.Posix.Types

Methods

compare :: CRLim -> CRLim -> Ordering #

(<) :: CRLim -> CRLim -> Bool #

(<=) :: CRLim -> CRLim -> Bool #

(>) :: CRLim -> CRLim -> Bool #

(>=) :: CRLim -> CRLim -> Bool #

max :: CRLim -> CRLim -> CRLim #

min :: CRLim -> CRLim -> CRLim #

Ord CSocklen 
Instance details

Defined in System.Posix.Types

Ord CSpeed 
Instance details

Defined in System.Posix.Types

Ord CSsize 
Instance details

Defined in System.Posix.Types

Ord CTcflag 
Instance details

Defined in System.Posix.Types

Ord CTimer 
Instance details

Defined in System.Posix.Types

Ord CUid 
Instance details

Defined in System.Posix.Types

Methods

compare :: CUid -> CUid -> Ordering #

(<) :: CUid -> CUid -> Bool #

(<=) :: CUid -> CUid -> Bool #

(>) :: CUid -> CUid -> Bool #

(>=) :: CUid -> CUid -> Bool #

max :: CUid -> CUid -> CUid #

min :: CUid -> CUid -> CUid #

Ord Fd 
Instance details

Defined in System.Posix.Types

Methods

compare :: Fd -> Fd -> Ordering #

(<) :: Fd -> Fd -> Bool #

(<=) :: Fd -> Fd -> Bool #

(>) :: Fd -> Fd -> Bool #

(>=) :: Fd -> Fd -> Bool #

max :: Fd -> Fd -> Fd #

min :: Fd -> Fd -> Fd #

Ord Encoding 
Instance details

Defined in Basement.String

Ord UTF32_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF32

Methods

compare :: UTF32_Invalid -> UTF32_Invalid -> Ordering #

(<) :: UTF32_Invalid -> UTF32_Invalid -> Bool #

(<=) :: UTF32_Invalid -> UTF32_Invalid -> Bool #

(>) :: UTF32_Invalid -> UTF32_Invalid -> Bool #

(>=) :: UTF32_Invalid -> UTF32_Invalid -> Bool #

max :: UTF32_Invalid -> UTF32_Invalid -> UTF32_Invalid #

min :: UTF32_Invalid -> UTF32_Invalid -> UTF32_Invalid #

Ord FileSize 
Instance details

Defined in Basement.Types.OffsetSize

Ord String 
Instance details

Defined in Basement.UTF8.Base

Ord ByteString 
Instance details

Defined in Data.ByteString.Internal

Ord ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Ord ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Ord IntSet 
Instance details

Defined in Data.IntSet.Internal

Ord ByteArray

Non-lexicographic ordering. This compares the lengths of the byte arrays first and uses a lexicographic ordering if the lengths are equal. Subject to change between major versions.

Instance details

Defined in Data.Array.Byte

Ord BigNat 
Instance details

Defined in GHC.Num.BigNat

Ord Extension 
Instance details

Defined in GHC.LanguageExtensions.Type

Ord Ordering 
Instance details

Defined in GHC.Classes

Ord TyCon 
Instance details

Defined in GHC.Classes

Methods

compare :: TyCon -> TyCon -> Ordering #

(<) :: TyCon -> TyCon -> Bool #

(<=) :: TyCon -> TyCon -> Bool #

(>) :: TyCon -> TyCon -> Bool #

(>=) :: TyCon -> TyCon -> Bool #

max :: TyCon -> TyCon -> TyCon #

min :: TyCon -> TyCon -> TyCon #

Ord ConnHost 
Instance details

Defined in Network.HTTP.Client.Types

Ord ConnKey 
Instance details

Defined in Network.HTTP.Client.Types

Ord Proxy 
Instance details

Defined in Network.HTTP.Client.Types

Methods

compare :: Proxy -> Proxy -> Ordering #

(<) :: Proxy -> Proxy -> Bool #

(<=) :: Proxy -> Proxy -> Bool #

(>) :: Proxy -> Proxy -> Bool #

(>=) :: Proxy -> Proxy -> Bool #

max :: Proxy -> Proxy -> Proxy #

min :: Proxy -> Proxy -> Proxy #

Ord ProxySecureMode 
Instance details

Defined in Network.HTTP.Client.Types

Ord StatusHeaders 
Instance details

Defined in Network.HTTP.Client.Types

Ord StreamFileStatus 
Instance details

Defined in Network.HTTP.Client.Types

Ord ByteRange 
Instance details

Defined in Network.HTTP.Types.Header

Ord StdMethod 
Instance details

Defined in Network.HTTP.Types.Method

Ord Status 
Instance details

Defined in Network.HTTP.Types.Status

Ord IP 
Instance details

Defined in Data.IP.Addr

Methods

compare :: IP -> IP -> Ordering #

(<) :: IP -> IP -> Bool #

(<=) :: IP -> IP -> Bool #

(>) :: IP -> IP -> Bool #

(>=) :: IP -> IP -> Bool #

max :: IP -> IP -> IP #

min :: IP -> IP -> IP #

Ord IPv4 
Instance details

Defined in Data.IP.Addr

Methods

compare :: IPv4 -> IPv4 -> Ordering #

(<) :: IPv4 -> IPv4 -> Bool #

(<=) :: IPv4 -> IPv4 -> Bool #

(>) :: IPv4 -> IPv4 -> Bool #

(>=) :: IPv4 -> IPv4 -> Bool #

max :: IPv4 -> IPv4 -> IPv4 #

min :: IPv4 -> IPv4 -> IPv4 #

Ord IPv6 
Instance details

Defined in Data.IP.Addr

Methods

compare :: IPv6 -> IPv6 -> Ordering #

(<) :: IPv6 -> IPv6 -> Bool #

(<=) :: IPv6 -> IPv6 -> Bool #

(>) :: IPv6 -> IPv6 -> Bool #

(>=) :: IPv6 -> IPv6 -> Bool #

max :: IPv6 -> IPv6 -> IPv6 #

min :: IPv6 -> IPv6 -> IPv6 #

Ord IPRange 
Instance details

Defined in Data.IP.Range

Ord LogLevel 
Instance details

Defined in Control.Monad.Logger

Ord LoggedMessage 
Instance details

Defined in Control.Monad.Logger.Aeson.Internal

Ord URI 
Instance details

Defined in Network.URI

Methods

compare :: URI -> URI -> Ordering #

(<) :: URI -> URI -> Bool #

(<=) :: URI -> URI -> Bool #

(>) :: URI -> URI -> Bool #

(>=) :: URI -> URI -> Bool #

max :: URI -> URI -> URI #

min :: URI -> URI -> URI #

Ord URIAuth 
Instance details

Defined in Network.URI

Ord ArgPolicy 
Instance details

Defined in Options.Applicative.Types

Ord OptName 
Instance details

Defined in Options.Applicative.Types

Ord OptVisibility 
Instance details

Defined in Options.Applicative.Types

Ord FusionDepth 
Instance details

Defined in Prettyprinter.Internal

Ord LayoutOptions 
Instance details

Defined in Prettyprinter.Internal

Ord PageWidth 
Instance details

Defined in Prettyprinter.Internal

Ord LogLevel 
Instance details

Defined in RIO.Prelude.Logger

Ord Scientific

Scientific numbers can be safely compared for ordering. No magnitude 10^e is calculated so there's no risk of a blowup in space or time when comparing scientific numbers coming from untrusted sources.

Instance details

Defined in Data.Scientific

Ord StackId Source # 
Instance details

Defined in Stackctl.AWS.CloudFormation

Ord StackName Source # 
Instance details

Defined in Stackctl.AWS.CloudFormation

Ord AccountId Source # 
Instance details

Defined in Stackctl.AWS.Core

Ord StackDescription Source # 
Instance details

Defined in Stackctl.StackDescription

Ord AnnLookup 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord AnnTarget 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Bang 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Bang -> Bang -> Ordering #

(<) :: Bang -> Bang -> Bool #

(<=) :: Bang -> Bang -> Bool #

(>) :: Bang -> Bang -> Bool #

(>=) :: Bang -> Bang -> Bool #

max :: Bang -> Bang -> Bang #

min :: Bang -> Bang -> Bang #

Ord Body 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Body -> Body -> Ordering #

(<) :: Body -> Body -> Bool #

(<=) :: Body -> Body -> Bool #

(>) :: Body -> Body -> Bool #

(>=) :: Body -> Body -> Bool #

max :: Body -> Body -> Body #

min :: Body -> Body -> Body #

Ord Bytes 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Bytes -> Bytes -> Ordering #

(<) :: Bytes -> Bytes -> Bool #

(<=) :: Bytes -> Bytes -> Bool #

(>) :: Bytes -> Bytes -> Bool #

(>=) :: Bytes -> Bytes -> Bool #

max :: Bytes -> Bytes -> Bytes #

min :: Bytes -> Bytes -> Bytes #

Ord Callconv 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Clause 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Con 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Con -> Con -> Ordering #

(<) :: Con -> Con -> Bool #

(<=) :: Con -> Con -> Bool #

(>) :: Con -> Con -> Bool #

(>=) :: Con -> Con -> Bool #

max :: Con -> Con -> Con #

min :: Con -> Con -> Con #

Ord Dec 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Dec -> Dec -> Ordering #

(<) :: Dec -> Dec -> Bool #

(<=) :: Dec -> Dec -> Bool #

(>) :: Dec -> Dec -> Bool #

(>=) :: Dec -> Dec -> Bool #

max :: Dec -> Dec -> Dec #

min :: Dec -> Dec -> Dec #

Ord DecidedStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord DerivClause 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord DerivStrategy 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord DocLoc 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Exp 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Exp -> Exp -> Ordering #

(<) :: Exp -> Exp -> Bool #

(<=) :: Exp -> Exp -> Bool #

(>) :: Exp -> Exp -> Bool #

(>=) :: Exp -> Exp -> Bool #

max :: Exp -> Exp -> Exp #

min :: Exp -> Exp -> Exp #

Ord FamilyResultSig 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Fixity 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord FixityDirection 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Foreign 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord FunDep 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Guard 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Guard -> Guard -> Ordering #

(<) :: Guard -> Guard -> Bool #

(<=) :: Guard -> Guard -> Bool #

(>) :: Guard -> Guard -> Bool #

(>=) :: Guard -> Guard -> Bool #

max :: Guard -> Guard -> Guard #

min :: Guard -> Guard -> Guard #

Ord Info 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Info -> Info -> Ordering #

(<) :: Info -> Info -> Bool #

(<=) :: Info -> Info -> Bool #

(>) :: Info -> Info -> Bool #

(>=) :: Info -> Info -> Bool #

max :: Info -> Info -> Info #

min :: Info -> Info -> Info #

Ord InjectivityAnn 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Inline 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Lit 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Lit -> Lit -> Ordering #

(<) :: Lit -> Lit -> Bool #

(<=) :: Lit -> Lit -> Bool #

(>) :: Lit -> Lit -> Bool #

(>=) :: Lit -> Lit -> Bool #

max :: Lit -> Lit -> Lit #

min :: Lit -> Lit -> Lit #

Ord Loc 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Loc -> Loc -> Ordering #

(<) :: Loc -> Loc -> Bool #

(<=) :: Loc -> Loc -> Bool #

(>) :: Loc -> Loc -> Bool #

(>=) :: Loc -> Loc -> Bool #

max :: Loc -> Loc -> Loc #

min :: Loc -> Loc -> Loc #

Ord Match 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Match -> Match -> Ordering #

(<) :: Match -> Match -> Bool #

(<=) :: Match -> Match -> Bool #

(>) :: Match -> Match -> Bool #

(>=) :: Match -> Match -> Bool #

max :: Match -> Match -> Match #

min :: Match -> Match -> Match #

Ord ModName 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Module 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord ModuleInfo 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Name 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Name -> Name -> Ordering #

(<) :: Name -> Name -> Bool #

(<=) :: Name -> Name -> Bool #

(>) :: Name -> Name -> Bool #

(>=) :: Name -> Name -> Bool #

max :: Name -> Name -> Name #

min :: Name -> Name -> Name #

Ord NameFlavour 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord NameSpace 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord OccName 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Overlap 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Pat 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Pat -> Pat -> Ordering #

(<) :: Pat -> Pat -> Bool #

(<=) :: Pat -> Pat -> Bool #

(>) :: Pat -> Pat -> Bool #

(>=) :: Pat -> Pat -> Bool #

max :: Pat -> Pat -> Pat #

min :: Pat -> Pat -> Pat #

Ord PatSynArgs 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord PatSynDir 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Phases 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord PkgName 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Pragma 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Range 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Range -> Range -> Ordering #

(<) :: Range -> Range -> Bool #

(<=) :: Range -> Range -> Bool #

(>) :: Range -> Range -> Bool #

(>=) :: Range -> Range -> Bool #

max :: Range -> Range -> Range #

min :: Range -> Range -> Range #

Ord Role 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Role -> Role -> Ordering #

(<) :: Role -> Role -> Bool #

(<=) :: Role -> Role -> Bool #

(>) :: Role -> Role -> Bool #

(>=) :: Role -> Role -> Bool #

max :: Role -> Role -> Role #

min :: Role -> Role -> Role #

Ord RuleBndr 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord RuleMatch 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Safety 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord SourceStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord SourceUnpackedness 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Specificity 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Stmt 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Stmt -> Stmt -> Ordering #

(<) :: Stmt -> Stmt -> Bool #

(<=) :: Stmt -> Stmt -> Bool #

(>) :: Stmt -> Stmt -> Bool #

(>=) :: Stmt -> Stmt -> Bool #

max :: Stmt -> Stmt -> Stmt #

min :: Stmt -> Stmt -> Stmt #

Ord TyLit 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: TyLit -> TyLit -> Ordering #

(<) :: TyLit -> TyLit -> Bool #

(<=) :: TyLit -> TyLit -> Bool #

(>) :: TyLit -> TyLit -> Bool #

(>=) :: TyLit -> TyLit -> Bool #

max :: TyLit -> TyLit -> TyLit #

min :: TyLit -> TyLit -> TyLit #

Ord TySynEqn 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Type 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Type -> Type -> Ordering #

(<) :: Type -> Type -> Bool #

(<=) :: Type -> Type -> Bool #

(>) :: Type -> Type -> Bool #

(>=) :: Type -> Type -> Bool #

max :: Type -> Type -> Type #

min :: Type -> Type -> Type #

Ord TypeFamilyHead 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord B 
Instance details

Defined in Data.Text.Short.Internal

Methods

compare :: B -> B -> Ordering #

(<) :: B -> B -> Bool #

(<=) :: B -> B -> Bool #

(>) :: B -> B -> Bool #

(>=) :: B -> B -> Bool #

max :: B -> B -> B #

min :: B -> B -> B #

Ord ShortText 
Instance details

Defined in Data.Text.Short.Internal

Ord ConstructorVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Ord DatatypeVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Ord FieldStrictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Ord Strictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Ord Unpackedness 
Instance details

Defined in Language.Haskell.TH.Datatype

Ord Day 
Instance details

Defined in Data.Time.Calendar.Days

Methods

compare :: Day -> Day -> Ordering #

(<) :: Day -> Day -> Bool #

(<=) :: Day -> Day -> Bool #

(>) :: Day -> Day -> Bool #

(>=) :: Day -> Day -> Bool #

max :: Day -> Day -> Day #

min :: Day -> Day -> Day #

Ord AbsoluteTime 
Instance details

Defined in Data.Time.Clock.Internal.AbsoluteTime

Ord DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Ord UTCTime 
Instance details

Defined in Data.Time.Clock.Internal.UTCTime

Ord UniversalTime 
Instance details

Defined in Data.Time.Clock.Internal.UniversalTime

Ord TimeLocale 
Instance details

Defined in Data.Time.Format.Locale

Ord LocalTime 
Instance details

Defined in Data.Time.LocalTime.Internal.LocalTime

Ord ConcException 
Instance details

Defined in UnliftIO.Internals.Async

Ord UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

compare :: UUID -> UUID -> Ordering #

(<) :: UUID -> UUID -> Bool #

(<=) :: UUID -> UUID -> Bool #

(>) :: UUID -> UUID -> Bool #

(>=) :: UUID -> UUID -> Bool #

max :: UUID -> UUID -> UUID #

min :: UUID -> UUID -> UUID #

Ord UnpackedUUID 
Instance details

Defined in Data.UUID.Types.Internal

Ord Content 
Instance details

Defined in Data.XML.Types

Ord Doctype 
Instance details

Defined in Data.XML.Types

Ord Document 
Instance details

Defined in Data.XML.Types

Ord Element 
Instance details

Defined in Data.XML.Types

Ord Event 
Instance details

Defined in Data.XML.Types

Methods

compare :: Event -> Event -> Ordering #

(<) :: Event -> Event -> Bool #

(<=) :: Event -> Event -> Bool #

(>) :: Event -> Event -> Bool #

(>=) :: Event -> Event -> Bool #

max :: Event -> Event -> Event #

min :: Event -> Event -> Event #

Ord ExternalID 
Instance details

Defined in Data.XML.Types

Ord Instruction 
Instance details

Defined in Data.XML.Types

Ord Miscellaneous 
Instance details

Defined in Data.XML.Types

Ord Name 
Instance details

Defined in Data.XML.Types

Methods

compare :: Name -> Name -> Ordering #

(<) :: Name -> Name -> Bool #

(<=) :: Name -> Name -> Bool #

(>) :: Name -> Name -> Bool #

(>=) :: Name -> Name -> Bool #

max :: Name -> Name -> Name #

min :: Name -> Name -> Name #

Ord Node 
Instance details

Defined in Data.XML.Types

Methods

compare :: Node -> Node -> Ordering #

(<) :: Node -> Node -> Bool #

(<=) :: Node -> Node -> Bool #

(>) :: Node -> Node -> Bool #

(>=) :: Node -> Node -> Bool #

max :: Node -> Node -> Node #

min :: Node -> Node -> Node #

Ord Prologue 
Instance details

Defined in Data.XML.Types

Ord CompressionStrategy 
Instance details

Defined in Codec.Compression.Zlib.Stream

Ord DictionaryHash 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

compare :: DictionaryHash -> DictionaryHash -> Ordering #

(<) :: DictionaryHash -> DictionaryHash -> Bool #

(<=) :: DictionaryHash -> DictionaryHash -> Bool #

(>) :: DictionaryHash -> DictionaryHash -> Bool #

(>=) :: DictionaryHash -> DictionaryHash -> Bool #

max :: DictionaryHash -> DictionaryHash -> DictionaryHash #

min :: DictionaryHash -> DictionaryHash -> DictionaryHash #

Ord Format 
Instance details

Defined in Codec.Compression.Zlib.Stream

Ord Method 
Instance details

Defined in Codec.Compression.Zlib.Stream

Ord WindowBits 
Instance details

Defined in Codec.Compression.Zlib.Stream

Ord Integer 
Instance details

Defined in GHC.Num.Integer

Ord Natural 
Instance details

Defined in GHC.Num.Natural

Ord () 
Instance details

Defined in GHC.Classes

Methods

compare :: () -> () -> Ordering #

(<) :: () -> () -> Bool #

(<=) :: () -> () -> Bool #

(>) :: () -> () -> Bool #

(>=) :: () -> () -> Bool #

max :: () -> () -> () #

min :: () -> () -> () #

Ord Bool 
Instance details

Defined in GHC.Classes

Methods

compare :: Bool -> Bool -> Ordering #

(<) :: Bool -> Bool -> Bool #

(<=) :: Bool -> Bool -> Bool #

(>) :: Bool -> Bool -> Bool #

(>=) :: Bool -> Bool -> Bool #

max :: Bool -> Bool -> Bool #

min :: Bool -> Bool -> Bool #

Ord Char 
Instance details

Defined in GHC.Classes

Methods

compare :: Char -> Char -> Ordering #

(<) :: Char -> Char -> Bool #

(<=) :: Char -> Char -> Bool #

(>) :: Char -> Char -> Bool #

(>=) :: Char -> Char -> Bool #

max :: Char -> Char -> Char #

min :: Char -> Char -> Char #

Ord Double

Note that due to the presence of NaN, Double's Ord instance does not satisfy reflexivity.

>>> 0/0 <= (0/0 :: Double)
False

Also note that, due to the same, Ord's operator interactions are not respected by Double's instance:

>>> (0/0 :: Double) > 1
False
>>> compare (0/0 :: Double) 1
GT
Instance details

Defined in GHC.Classes

Ord Float

Note that due to the presence of NaN, Float's Ord instance does not satisfy reflexivity.

>>> 0/0 <= (0/0 :: Float)
False

Also note that, due to the same, Ord's operator interactions are not respected by Float's instance:

>>> (0/0 :: Float) > 1
False
>>> compare (0/0 :: Float) 1
GT
Instance details

Defined in GHC.Classes

Methods

compare :: Float -> Float -> Ordering #

(<) :: Float -> Float -> Bool #

(<=) :: Float -> Float -> Bool #

(>) :: Float -> Float -> Bool #

(>=) :: Float -> Float -> Bool #

max :: Float -> Float -> Float #

min :: Float -> Float -> Float #

Ord Int 
Instance details

Defined in GHC.Classes

Methods

compare :: Int -> Int -> Ordering #

(<) :: Int -> Int -> Bool #

(<=) :: Int -> Int -> Bool #

(>) :: Int -> Int -> Bool #

(>=) :: Int -> Int -> Bool #

max :: Int -> Int -> Int #

min :: Int -> Int -> Int #

Ord Word 
Instance details

Defined in GHC.Classes

Methods

compare :: Word -> Word -> Ordering #

(<) :: Word -> Word -> Bool #

(<=) :: Word -> Word -> Bool #

(>) :: Word -> Word -> Bool #

(>=) :: Word -> Word -> Bool #

max :: Word -> Word -> Word #

min :: Word -> Word -> Word #

Ord a => Ord (Blind a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

compare :: Blind a -> Blind a -> Ordering #

(<) :: Blind a -> Blind a -> Bool #

(<=) :: Blind a -> Blind a -> Bool #

(>) :: Blind a -> Blind a -> Bool #

(>=) :: Blind a -> Blind a -> Bool #

max :: Blind a -> Blind a -> Blind a #

min :: Blind a -> Blind a -> Blind a #

Ord a => Ord (Fixed a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

compare :: Fixed a -> Fixed a -> Ordering #

(<) :: Fixed a -> Fixed a -> Bool #

(<=) :: Fixed a -> Fixed a -> Bool #

(>) :: Fixed a -> Fixed a -> Bool #

(>=) :: Fixed a -> Fixed a -> Bool #

max :: Fixed a -> Fixed a -> Fixed a #

min :: Fixed a -> Fixed a -> Fixed a #

Ord a => Ord (Large a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

compare :: Large a -> Large a -> Ordering #

(<) :: Large a -> Large a -> Bool #

(<=) :: Large a -> Large a -> Bool #

(>) :: Large a -> Large a -> Bool #

(>=) :: Large a -> Large a -> Bool #

max :: Large a -> Large a -> Large a #

min :: Large a -> Large a -> Large a #

Ord a => Ord (Negative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

compare :: Negative a -> Negative a -> Ordering #

(<) :: Negative a -> Negative a -> Bool #

(<=) :: Negative a -> Negative a -> Bool #

(>) :: Negative a -> Negative a -> Bool #

(>=) :: Negative a -> Negative a -> Bool #

max :: Negative a -> Negative a -> Negative a #

min :: Negative a -> Negative a -> Negative a #

Ord a => Ord (NonEmptyList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Ord a => Ord (NonNegative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Ord a => Ord (NonPositive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Ord a => Ord (NonZero a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

compare :: NonZero a -> NonZero a -> Ordering #

(<) :: NonZero a -> NonZero a -> Bool #

(<=) :: NonZero a -> NonZero a -> Bool #

(>) :: NonZero a -> NonZero a -> Bool #

(>=) :: NonZero a -> NonZero a -> Bool #

max :: NonZero a -> NonZero a -> NonZero a #

min :: NonZero a -> NonZero a -> NonZero a #

Ord a => Ord (OrderedList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Ord a => Ord (Positive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

compare :: Positive a -> Positive a -> Ordering #

(<) :: Positive a -> Positive a -> Bool #

(<=) :: Positive a -> Positive a -> Bool #

(>) :: Positive a -> Positive a -> Bool #

(>=) :: Positive a -> Positive a -> Bool #

max :: Positive a -> Positive a -> Positive a #

min :: Positive a -> Positive a -> Positive a #

Ord a => Ord (Shrink2 a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

compare :: Shrink2 a -> Shrink2 a -> Ordering #

(<) :: Shrink2 a -> Shrink2 a -> Bool #

(<=) :: Shrink2 a -> Shrink2 a -> Bool #

(>) :: Shrink2 a -> Shrink2 a -> Bool #

(>=) :: Shrink2 a -> Shrink2 a -> Bool #

max :: Shrink2 a -> Shrink2 a -> Shrink2 a #

min :: Shrink2 a -> Shrink2 a -> Shrink2 a #

Ord a => Ord (Small a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

compare :: Small a -> Small a -> Ordering #

(<) :: Small a -> Small a -> Bool #

(<=) :: Small a -> Small a -> Bool #

(>) :: Small a -> Small a -> Bool #

(>=) :: Small a -> Small a -> Bool #

max :: Small a -> Small a -> Small a #

min :: Small a -> Small a -> Small a #

Ord a => Ord (SortedList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Ord (Encoding' a) 
Instance details

Defined in Data.Aeson.Encoding.Internal

Ord v => Ord (KeyMap v) 
Instance details

Defined in Data.Aeson.KeyMap

Methods

compare :: KeyMap v -> KeyMap v -> Ordering #

(<) :: KeyMap v -> KeyMap v -> Bool #

(<=) :: KeyMap v -> KeyMap v -> Bool #

(>) :: KeyMap v -> KeyMap v -> Bool #

(>=) :: KeyMap v -> KeyMap v -> Bool #

max :: KeyMap v -> KeyMap v -> KeyMap v #

min :: KeyMap v -> KeyMap v -> KeyMap v #

Ord a => Ord (Sensitive a) 
Instance details

Defined in Amazonka.Data.Sensitive

Ord (Time a) 
Instance details

Defined in Amazonka.Data.Time

Methods

compare :: Time a -> Time a -> Ordering #

(<) :: Time a -> Time a -> Bool #

(<=) :: Time a -> Time a -> Bool #

(>) :: Time a -> Time a -> Bool #

(>=) :: Time a -> Time a -> Bool #

max :: Time a -> Time a -> Time a #

min :: Time a -> Time a -> Time a #

Ord (Async a) 
Instance details

Defined in Control.Concurrent.Async

Methods

compare :: Async a -> Async a -> Ordering #

(<) :: Async a -> Async a -> Bool #

(<=) :: Async a -> Async a -> Bool #

(>) :: Async a -> Async a -> Bool #

(>=) :: Async a -> Async a -> Bool #

max :: Async a -> Async a -> Async a #

min :: Async a -> Async a -> Async a #

Ord a => Ord (ZipList a)

Since: base-4.7.0.0

Instance details

Defined in Control.Applicative

Methods

compare :: ZipList a -> ZipList a -> Ordering #

(<) :: ZipList a -> ZipList a -> Bool #

(<=) :: ZipList a -> ZipList a -> Bool #

(>) :: ZipList a -> ZipList a -> Bool #

(>=) :: ZipList a -> ZipList a -> Bool #

max :: ZipList a -> ZipList a -> ZipList a #

min :: ZipList a -> ZipList a -> ZipList a #

Ord a => Ord (Identity a)

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

compare :: Identity a -> Identity a -> Ordering #

(<) :: Identity a -> Identity a -> Bool #

(<=) :: Identity a -> Identity a -> Bool #

(>) :: Identity a -> Identity a -> Bool #

(>=) :: Identity a -> Identity a -> Bool #

max :: Identity a -> Identity a -> Identity a #

min :: Identity a -> Identity a -> Identity a #

Ord a => Ord (First a)

Since: base-2.1

Instance details

Defined in Data.Monoid

Methods

compare :: First a -> First a -> Ordering #

(<) :: First a -> First a -> Bool #

(<=) :: First a -> First a -> Bool #

(>) :: First a -> First a -> Bool #

(>=) :: First a -> First a -> Bool #

max :: First a -> First a -> First a #

min :: First a -> First a -> First a #

Ord a => Ord (Last a)

Since: base-2.1

Instance details

Defined in Data.Monoid

Methods

compare :: Last a -> Last a -> Ordering #

(<) :: Last a -> Last a -> Bool #

(<=) :: Last a -> Last a -> Bool #

(>) :: Last a -> Last a -> Bool #

(>=) :: Last a -> Last a -> Bool #

max :: Last a -> Last a -> Last a #

min :: Last a -> Last a -> Last a #

Ord a => Ord (Down a)

Since: base-4.6.0.0

Instance details

Defined in Data.Ord

Methods

compare :: Down a -> Down a -> Ordering #

(<) :: Down a -> Down a -> Bool #

(<=) :: Down a -> Down a -> Bool #

(>) :: Down a -> Down a -> Bool #

(>=) :: Down a -> Down a -> Bool #

max :: Down a -> Down a -> Down a #

min :: Down a -> Down a -> Down a #

Ord a => Ord (First a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

compare :: First a -> First a -> Ordering #

(<) :: First a -> First a -> Bool #

(<=) :: First a -> First a -> Bool #

(>) :: First a -> First a -> Bool #

(>=) :: First a -> First a -> Bool #

max :: First a -> First a -> First a #

min :: First a -> First a -> First a #

Ord a => Ord (Last a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

compare :: Last a -> Last a -> Ordering #

(<) :: Last a -> Last a -> Bool #

(<=) :: Last a -> Last a -> Bool #

(>) :: Last a -> Last a -> Bool #

(>=) :: Last a -> Last a -> Bool #

max :: Last a -> Last a -> Last a #

min :: Last a -> Last a -> Last a #

Ord a => Ord (Max a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

compare :: Max a -> Max a -> Ordering #

(<) :: Max a -> Max a -> Bool #

(<=) :: Max a -> Max a -> Bool #

(>) :: Max a -> Max a -> Bool #

(>=) :: Max a -> Max a -> Bool #

max :: Max a -> Max a -> Max a #

min :: Max a -> Max a -> Max a #

Ord a => Ord (Min a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

compare :: Min a -> Min a -> Ordering #

(<) :: Min a -> Min a -> Bool #

(<=) :: Min a -> Min a -> Bool #

(>) :: Min a -> Min a -> Bool #

(>=) :: Min a -> Min a -> Bool #

max :: Min a -> Min a -> Min a #

min :: Min a -> Min a -> Min a #

Ord m => Ord (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Ord a => Ord (Dual a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

compare :: Dual a -> Dual a -> Ordering #

(<) :: Dual a -> Dual a -> Bool #

(<=) :: Dual a -> Dual a -> Bool #

(>) :: Dual a -> Dual a -> Bool #

(>=) :: Dual a -> Dual a -> Bool #

max :: Dual a -> Dual a -> Dual a #

min :: Dual a -> Dual a -> Dual a #

Ord a => Ord (Product a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

compare :: Product a -> Product a -> Ordering #

(<) :: Product a -> Product a -> Bool #

(<=) :: Product a -> Product a -> Bool #

(>) :: Product a -> Product a -> Bool #

(>=) :: Product a -> Product a -> Bool #

max :: Product a -> Product a -> Product a #

min :: Product a -> Product a -> Product a #

Ord a => Ord (Sum a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

compare :: Sum a -> Sum a -> Ordering #

(<) :: Sum a -> Sum a -> Bool #

(<=) :: Sum a -> Sum a -> Bool #

(>) :: Sum a -> Sum a -> Bool #

(>=) :: Sum a -> Sum a -> Bool #

max :: Sum a -> Sum a -> Sum a #

min :: Sum a -> Sum a -> Sum a #

Ord (ForeignPtr a)

Since: base-2.1

Instance details

Defined in GHC.ForeignPtr

Ord p => Ord (Par1 p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: Par1 p -> Par1 p -> Ordering #

(<) :: Par1 p -> Par1 p -> Bool #

(<=) :: Par1 p -> Par1 p -> Bool #

(>) :: Par1 p -> Par1 p -> Bool #

(>=) :: Par1 p -> Par1 p -> Bool #

max :: Par1 p -> Par1 p -> Par1 p #

min :: Par1 p -> Par1 p -> Par1 p #

Ord (FunPtr a) 
Instance details

Defined in GHC.Ptr

Methods

compare :: FunPtr a -> FunPtr a -> Ordering #

(<) :: FunPtr a -> FunPtr a -> Bool #

(<=) :: FunPtr a -> FunPtr a -> Bool #

(>) :: FunPtr a -> FunPtr a -> Bool #

(>=) :: FunPtr a -> FunPtr a -> Bool #

max :: FunPtr a -> FunPtr a -> FunPtr a #

min :: FunPtr a -> FunPtr a -> FunPtr a #

Ord (Ptr a)

Since: base-2.1

Instance details

Defined in GHC.Ptr

Methods

compare :: Ptr a -> Ptr a -> Ordering #

(<) :: Ptr a -> Ptr a -> Bool #

(<=) :: Ptr a -> Ptr a -> Bool #

(>) :: Ptr a -> Ptr a -> Bool #

(>=) :: Ptr a -> Ptr a -> Bool #

max :: Ptr a -> Ptr a -> Ptr a #

min :: Ptr a -> Ptr a -> Ptr a #

Integral a => Ord (Ratio a)

Since: base-2.0.1

Instance details

Defined in GHC.Real

Methods

compare :: Ratio a -> Ratio a -> Ordering #

(<) :: Ratio a -> Ratio a -> Bool #

(<=) :: Ratio a -> Ratio a -> Bool #

(>) :: Ratio a -> Ratio a -> Bool #

(>=) :: Ratio a -> Ratio a -> Bool #

max :: Ratio a -> Ratio a -> Ratio a #

min :: Ratio a -> Ratio a -> Ratio a #

Ord (Bits n) 
Instance details

Defined in Basement.Bits

Methods

compare :: Bits n -> Bits n -> Ordering #

(<) :: Bits n -> Bits n -> Bool #

(<=) :: Bits n -> Bits n -> Bool #

(>) :: Bits n -> Bits n -> Bool #

(>=) :: Bits n -> Bits n -> Bool #

max :: Bits n -> Bits n -> Bits n #

min :: Bits n -> Bits n -> Bits n #

(PrimType ty, Ord ty) => Ord (Block ty) 
Instance details

Defined in Basement.Block.Base

Methods

compare :: Block ty -> Block ty -> Ordering #

(<) :: Block ty -> Block ty -> Bool #

(<=) :: Block ty -> Block ty -> Bool #

(>) :: Block ty -> Block ty -> Bool #

(>=) :: Block ty -> Block ty -> Bool #

max :: Block ty -> Block ty -> Block ty #

min :: Block ty -> Block ty -> Block ty #

Ord (Zn n) 
Instance details

Defined in Basement.Bounded

Methods

compare :: Zn n -> Zn n -> Ordering #

(<) :: Zn n -> Zn n -> Bool #

(<=) :: Zn n -> Zn n -> Bool #

(>) :: Zn n -> Zn n -> Bool #

(>=) :: Zn n -> Zn n -> Bool #

max :: Zn n -> Zn n -> Zn n #

min :: Zn n -> Zn n -> Zn n #

Ord (Zn64 n) 
Instance details

Defined in Basement.Bounded

Methods

compare :: Zn64 n -> Zn64 n -> Ordering #

(<) :: Zn64 n -> Zn64 n -> Bool #

(<=) :: Zn64 n -> Zn64 n -> Bool #

(>) :: Zn64 n -> Zn64 n -> Bool #

(>=) :: Zn64 n -> Zn64 n -> Bool #

max :: Zn64 n -> Zn64 n -> Zn64 n #

min :: Zn64 n -> Zn64 n -> Zn64 n #

Ord (CountOf ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

compare :: CountOf ty -> CountOf ty -> Ordering #

(<) :: CountOf ty -> CountOf ty -> Bool #

(<=) :: CountOf ty -> CountOf ty -> Bool #

(>) :: CountOf ty -> CountOf ty -> Bool #

(>=) :: CountOf ty -> CountOf ty -> Bool #

max :: CountOf ty -> CountOf ty -> CountOf ty #

min :: CountOf ty -> CountOf ty -> CountOf ty #

Ord (Offset ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

compare :: Offset ty -> Offset ty -> Ordering #

(<) :: Offset ty -> Offset ty -> Bool #

(<=) :: Offset ty -> Offset ty -> Bool #

(>) :: Offset ty -> Offset ty -> Bool #

(>=) :: Offset ty -> Offset ty -> Bool #

max :: Offset ty -> Offset ty -> Offset ty #

min :: Offset ty -> Offset ty -> Offset ty #

(PrimType ty, Ord ty) => Ord (UArray ty) 
Instance details

Defined in Basement.UArray.Base

Methods

compare :: UArray ty -> UArray ty -> Ordering #

(<) :: UArray ty -> UArray ty -> Bool #

(<=) :: UArray ty -> UArray ty -> Bool #

(>) :: UArray ty -> UArray ty -> Bool #

(>=) :: UArray ty -> UArray ty -> Bool #

max :: UArray ty -> UArray ty -> UArray ty #

min :: UArray ty -> UArray ty -> UArray ty #

Ord a => Ord (Flush a) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

compare :: Flush a -> Flush a -> Ordering #

(<) :: Flush a -> Flush a -> Bool #

(<=) :: Flush a -> Flush a -> Bool #

(>) :: Flush a -> Flush a -> Bool #

(>=) :: Flush a -> Flush a -> Bool #

max :: Flush a -> Flush a -> Flush a #

min :: Flush a -> Flush a -> Flush a #

Ord a => Ord (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

compare :: IntMap a -> IntMap a -> Ordering #

(<) :: IntMap a -> IntMap a -> Bool #

(<=) :: IntMap a -> IntMap a -> Bool #

(>) :: IntMap a -> IntMap a -> Bool #

(>=) :: IntMap a -> IntMap a -> Bool #

max :: IntMap a -> IntMap a -> IntMap a #

min :: IntMap a -> IntMap a -> IntMap a #

Ord a => Ord (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

compare :: Seq a -> Seq a -> Ordering #

(<) :: Seq a -> Seq a -> Bool #

(<=) :: Seq a -> Seq a -> Bool #

(>) :: Seq a -> Seq a -> Bool #

(>=) :: Seq a -> Seq a -> Bool #

max :: Seq a -> Seq a -> Seq a #

min :: Seq a -> Seq a -> Seq a #

Ord a => Ord (ViewL a) 
Instance details

Defined in Data.Sequence.Internal

Methods

compare :: ViewL a -> ViewL a -> Ordering #

(<) :: ViewL a -> ViewL a -> Bool #

(<=) :: ViewL a -> ViewL a -> Bool #

(>) :: ViewL a -> ViewL a -> Bool #

(>=) :: ViewL a -> ViewL a -> Bool #

max :: ViewL a -> ViewL a -> ViewL a #

min :: ViewL a -> ViewL a -> ViewL a #

Ord a => Ord (ViewR a) 
Instance details

Defined in Data.Sequence.Internal

Methods

compare :: ViewR a -> ViewR a -> Ordering #

(<) :: ViewR a -> ViewR a -> Bool #

(<=) :: ViewR a -> ViewR a -> Bool #

(>) :: ViewR a -> ViewR a -> Bool #

(>=) :: ViewR a -> ViewR a -> Bool #

max :: ViewR a -> ViewR a -> ViewR a #

min :: ViewR a -> ViewR a -> ViewR a #

Ord a => Ord (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

compare :: Set a -> Set a -> Ordering #

(<) :: Set a -> Set a -> Bool #

(<=) :: Set a -> Set a -> Bool #

(>) :: Set a -> Set a -> Bool #

(>=) :: Set a -> Set a -> Bool #

max :: Set a -> Set a -> Set a #

min :: Set a -> Set a -> Set a #

Ord a => Ord (Tree a)

Since: containers-0.6.5

Instance details

Defined in Data.Tree

Methods

compare :: Tree a -> Tree a -> Ordering #

(<) :: Tree a -> Tree a -> Bool #

(<=) :: Tree a -> Tree a -> Bool #

(>) :: Tree a -> Tree a -> Bool #

(>=) :: Tree a -> Tree a -> Bool #

max :: Tree a -> Tree a -> Tree a #

min :: Tree a -> Tree a -> Tree a #

Ord (Digest a) 
Instance details

Defined in Crypto.Hash.Types

Methods

compare :: Digest a -> Digest a -> Ordering #

(<) :: Digest a -> Digest a -> Bool #

(<=) :: Digest a -> Digest a -> Bool #

(>) :: Digest a -> Digest a -> Bool #

(>=) :: Digest a -> Digest a -> Bool #

max :: Digest a -> Digest a -> Digest a #

min :: Digest a -> Digest a -> Digest a #

Ord1 f => Ord (Fix f) 
Instance details

Defined in Data.Fix

Methods

compare :: Fix f -> Fix f -> Ordering #

(<) :: Fix f -> Fix f -> Bool #

(<=) :: Fix f -> Fix f -> Bool #

(>) :: Fix f -> Fix f -> Bool #

(>=) :: Fix f -> Fix f -> Bool #

max :: Fix f -> Fix f -> Fix f #

min :: Fix f -> Fix f -> Fix f #

(Functor f, Ord1 f) => Ord (Mu f) 
Instance details

Defined in Data.Fix

Methods

compare :: Mu f -> Mu f -> Ordering #

(<) :: Mu f -> Mu f -> Bool #

(<=) :: Mu f -> Mu f -> Bool #

(>) :: Mu f -> Mu f -> Bool #

(>=) :: Mu f -> Mu f -> Bool #

max :: Mu f -> Mu f -> Mu f #

min :: Mu f -> Mu f -> Mu f #

(Functor f, Ord1 f) => Ord (Nu f) 
Instance details

Defined in Data.Fix

Methods

compare :: Nu f -> Nu f -> Ordering #

(<) :: Nu f -> Nu f -> Bool #

(<=) :: Nu f -> Nu f -> Bool #

(>) :: Nu f -> Nu f -> Bool #

(>=) :: Nu f -> Nu f -> Bool #

max :: Nu f -> Nu f -> Nu f #

min :: Nu f -> Nu f -> Nu f #

Ord a => Ord (DNonEmpty a) 
Instance details

Defined in Data.DList.DNonEmpty.Internal

Ord a => Ord (DList a) 
Instance details

Defined in Data.DList.Internal

Methods

compare :: DList a -> DList a -> Ordering #

(<) :: DList a -> DList a -> Bool #

(<=) :: DList a -> DList a -> Bool #

(>) :: DList a -> DList a -> Bool #

(>=) :: DList a -> DList a -> Bool #

max :: DList a -> DList a -> DList a #

min :: DList a -> DList a -> DList a #

Ord a => Ord (Hashed a) 
Instance details

Defined in Data.Hashable.Class

Methods

compare :: Hashed a -> Hashed a -> Ordering #

(<) :: Hashed a -> Hashed a -> Bool #

(<=) :: Hashed a -> Hashed a -> Bool #

(>) :: Hashed a -> Hashed a -> Bool #

(>=) :: Hashed a -> Hashed a -> Bool #

max :: Hashed a -> Hashed a -> Hashed a #

min :: Hashed a -> Hashed a -> Hashed a #

Ord a => Ord (AddrRange a) 
Instance details

Defined in Data.IP.Range

Ord mono => Ord (NonNull mono) 
Instance details

Defined in Data.NonNull

Methods

compare :: NonNull mono -> NonNull mono -> Ordering #

(<) :: NonNull mono -> NonNull mono -> Bool #

(<=) :: NonNull mono -> NonNull mono -> Bool #

(>) :: NonNull mono -> NonNull mono -> Bool #

(>=) :: NonNull mono -> NonNull mono -> Bool #

max :: NonNull mono -> NonNull mono -> NonNull mono #

min :: NonNull mono -> NonNull mono -> NonNull mono #

Ord ann => Ord (SimpleDocStream ann) 
Instance details

Defined in Prettyprinter.Internal

Ord a => Ord (Array a)

Lexicographic ordering. Subject to change between major versions.

Instance details

Defined in Data.Primitive.Array

Methods

compare :: Array a -> Array a -> Ordering #

(<) :: Array a -> Array a -> Bool #

(<=) :: Array a -> Array a -> Bool #

(>) :: Array a -> Array a -> Bool #

(>=) :: Array a -> Array a -> Bool #

max :: Array a -> Array a -> Array a #

min :: Array a -> Array a -> Array a #

(Ord a, Prim a) => Ord (PrimArray a)

Lexicographic ordering. Subject to change between major versions.

Since: primitive-0.6.4.0

Instance details

Defined in Data.Primitive.PrimArray

Ord a => Ord (SmallArray a)

Lexicographic ordering. Subject to change between major versions.

Instance details

Defined in Data.Primitive.SmallArray

Ord g => Ord (StateGen g) 
Instance details

Defined in System.Random.Internal

Methods

compare :: StateGen g -> StateGen g -> Ordering #

(<) :: StateGen g -> StateGen g -> Bool #

(<=) :: StateGen g -> StateGen g -> Bool #

(>) :: StateGen g -> StateGen g -> Bool #

(>=) :: StateGen g -> StateGen g -> Bool #

max :: StateGen g -> StateGen g -> StateGen g #

min :: StateGen g -> StateGen g -> StateGen g #

Ord g => Ord (AtomicGen g) 
Instance details

Defined in System.Random.Stateful

Ord g => Ord (IOGen g) 
Instance details

Defined in System.Random.Stateful

Methods

compare :: IOGen g -> IOGen g -> Ordering #

(<) :: IOGen g -> IOGen g -> Bool #

(<=) :: IOGen g -> IOGen g -> Bool #

(>) :: IOGen g -> IOGen g -> Bool #

(>=) :: IOGen g -> IOGen g -> Bool #

max :: IOGen g -> IOGen g -> IOGen g #

min :: IOGen g -> IOGen g -> IOGen g #

Ord g => Ord (STGen g) 
Instance details

Defined in System.Random.Stateful

Methods

compare :: STGen g -> STGen g -> Ordering #

(<) :: STGen g -> STGen g -> Bool #

(<=) :: STGen g -> STGen g -> Bool #

(>) :: STGen g -> STGen g -> Bool #

(>=) :: STGen g -> STGen g -> Bool #

max :: STGen g -> STGen g -> STGen g #

min :: STGen g -> STGen g -> STGen g #

Ord g => Ord (TGen g) 
Instance details

Defined in System.Random.Stateful

Methods

compare :: TGen g -> TGen g -> Ordering #

(<) :: TGen g -> TGen g -> Bool #

(<=) :: TGen g -> TGen g -> Bool #

(>) :: TGen g -> TGen g -> Bool #

(>=) :: TGen g -> TGen g -> Bool #

max :: TGen g -> TGen g -> TGen g #

min :: TGen g -> TGen g -> TGen g #

Ord a => Ord (Maybe a) 
Instance details

Defined in Data.Strict.Maybe

Methods

compare :: Maybe a -> Maybe a -> Ordering #

(<) :: Maybe a -> Maybe a -> Bool #

(<=) :: Maybe a -> Maybe a -> Bool #

(>) :: Maybe a -> Maybe a -> Bool #

(>=) :: Maybe a -> Maybe a -> Bool #

max :: Maybe a -> Maybe a -> Maybe a #

min :: Maybe a -> Maybe a -> Maybe a #

Ord flag => Ord (TyVarBndr flag) 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: TyVarBndr flag -> TyVarBndr flag -> Ordering #

(<) :: TyVarBndr flag -> TyVarBndr flag -> Bool #

(<=) :: TyVarBndr flag -> TyVarBndr flag -> Bool #

(>) :: TyVarBndr flag -> TyVarBndr flag -> Bool #

(>=) :: TyVarBndr flag -> TyVarBndr flag -> Bool #

max :: TyVarBndr flag -> TyVarBndr flag -> TyVarBndr flag #

min :: TyVarBndr flag -> TyVarBndr flag -> TyVarBndr flag #

Ord a => Ord (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Methods

compare :: HashSet a -> HashSet a -> Ordering #

(<) :: HashSet a -> HashSet a -> Bool #

(<=) :: HashSet a -> HashSet a -> Bool #

(>) :: HashSet a -> HashSet a -> Bool #

(>=) :: HashSet a -> HashSet a -> Bool #

max :: HashSet a -> HashSet a -> HashSet a #

min :: HashSet a -> HashSet a -> HashSet a #

Ord a => Ord (Vector a) 
Instance details

Defined in Data.Vector

Methods

compare :: Vector a -> Vector a -> Ordering #

(<) :: Vector a -> Vector a -> Bool #

(<=) :: Vector a -> Vector a -> Bool #

(>) :: Vector a -> Vector a -> Bool #

(>=) :: Vector a -> Vector a -> Bool #

max :: Vector a -> Vector a -> Vector a #

min :: Vector a -> Vector a -> Vector a #

(Prim a, Ord a) => Ord (Vector a) 
Instance details

Defined in Data.Vector.Primitive

Methods

compare :: Vector a -> Vector a -> Ordering #

(<) :: Vector a -> Vector a -> Bool #

(<=) :: Vector a -> Vector a -> Bool #

(>) :: Vector a -> Vector a -> Bool #

(>=) :: Vector a -> Vector a -> Bool #

max :: Vector a -> Vector a -> Vector a #

min :: Vector a -> Vector a -> Vector a #

(Storable a, Ord a) => Ord (Vector a) 
Instance details

Defined in Data.Vector.Storable

Methods

compare :: Vector a -> Vector a -> Ordering #

(<) :: Vector a -> Vector a -> Bool #

(<=) :: Vector a -> Vector a -> Bool #

(>) :: Vector a -> Vector a -> Bool #

(>=) :: Vector a -> Vector a -> Bool #

max :: Vector a -> Vector a -> Vector a #

min :: Vector a -> Vector a -> Vector a #

Ord a => Ord (NonEmpty a)

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

compare :: NonEmpty a -> NonEmpty a -> Ordering #

(<) :: NonEmpty a -> NonEmpty a -> Bool #

(<=) :: NonEmpty a -> NonEmpty a -> Bool #

(>) :: NonEmpty a -> NonEmpty a -> Bool #

(>=) :: NonEmpty a -> NonEmpty a -> Bool #

max :: NonEmpty a -> NonEmpty a -> NonEmpty a #

min :: NonEmpty a -> NonEmpty a -> NonEmpty a #

Ord a => Ord (Maybe a)

Since: base-2.1

Instance details

Defined in GHC.Maybe

Methods

compare :: Maybe a -> Maybe a -> Ordering #

(<) :: Maybe a -> Maybe a -> Bool #

(<=) :: Maybe a -> Maybe a -> Bool #

(>) :: Maybe a -> Maybe a -> Bool #

(>=) :: Maybe a -> Maybe a -> Bool #

max :: Maybe a -> Maybe a -> Maybe a #

min :: Maybe a -> Maybe a -> Maybe a #

Ord a => Ord (a) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a) -> (a) -> Ordering #

(<) :: (a) -> (a) -> Bool #

(<=) :: (a) -> (a) -> Bool #

(>) :: (a) -> (a) -> Bool #

(>=) :: (a) -> (a) -> Bool #

max :: (a) -> (a) -> (a) #

min :: (a) -> (a) -> (a) #

Ord a => Ord [a] 
Instance details

Defined in GHC.Classes

Methods

compare :: [a] -> [a] -> Ordering #

(<) :: [a] -> [a] -> Bool #

(<=) :: [a] -> [a] -> Bool #

(>) :: [a] -> [a] -> Bool #

(>=) :: [a] -> [a] -> Bool #

max :: [a] -> [a] -> [a] #

min :: [a] -> [a] -> [a] #

(Ord a, Ord b) => Ord (Either a b)

Since: base-2.1

Instance details

Defined in Data.Either

Methods

compare :: Either a b -> Either a b -> Ordering #

(<) :: Either a b -> Either a b -> Bool #

(<=) :: Either a b -> Either a b -> Bool #

(>) :: Either a b -> Either a b -> Bool #

(>=) :: Either a b -> Either a b -> Bool #

max :: Either a b -> Either a b -> Either a b #

min :: Either a b -> Either a b -> Either a b #

Ord (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

compare :: Proxy s -> Proxy s -> Ordering #

(<) :: Proxy s -> Proxy s -> Bool #

(<=) :: Proxy s -> Proxy s -> Bool #

(>) :: Proxy s -> Proxy s -> Bool #

(>=) :: Proxy s -> Proxy s -> Bool #

max :: Proxy s -> Proxy s -> Proxy s #

min :: Proxy s -> Proxy s -> Proxy s #

Ord a => Ord (Arg a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

compare :: Arg a b -> Arg a b -> Ordering #

(<) :: Arg a b -> Arg a b -> Bool #

(<=) :: Arg a b -> Arg a b -> Bool #

(>) :: Arg a b -> Arg a b -> Bool #

(>=) :: Arg a b -> Arg a b -> Bool #

max :: Arg a b -> Arg a b -> Arg a b #

min :: Arg a b -> Arg a b -> Arg a b #

Ord (TypeRep a)

Since: base-4.4.0.0

Instance details

Defined in Data.Typeable.Internal

Methods

compare :: TypeRep a -> TypeRep a -> Ordering #

(<) :: TypeRep a -> TypeRep a -> Bool #

(<=) :: TypeRep a -> TypeRep a -> Bool #

(>) :: TypeRep a -> TypeRep a -> Bool #

(>=) :: TypeRep a -> TypeRep a -> Bool #

max :: TypeRep a -> TypeRep a -> TypeRep a #

min :: TypeRep a -> TypeRep a -> TypeRep a #

(Ix i, Ord e) => Ord (Array i e)

Since: base-2.1

Instance details

Defined in GHC.Arr

Methods

compare :: Array i e -> Array i e -> Ordering #

(<) :: Array i e -> Array i e -> Bool #

(<=) :: Array i e -> Array i e -> Bool #

(>) :: Array i e -> Array i e -> Bool #

(>=) :: Array i e -> Array i e -> Bool #

max :: Array i e -> Array i e -> Array i e #

min :: Array i e -> Array i e -> Array i e #

Ord (U1 p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: U1 p -> U1 p -> Ordering #

(<) :: U1 p -> U1 p -> Bool #

(<=) :: U1 p -> U1 p -> Bool #

(>) :: U1 p -> U1 p -> Bool #

(>=) :: U1 p -> U1 p -> Bool #

max :: U1 p -> U1 p -> U1 p #

min :: U1 p -> U1 p -> U1 p #

Ord (V1 p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: V1 p -> V1 p -> Ordering #

(<) :: V1 p -> V1 p -> Bool #

(<=) :: V1 p -> V1 p -> Bool #

(>) :: V1 p -> V1 p -> Bool #

(>=) :: V1 p -> V1 p -> Bool #

max :: V1 p -> V1 p -> V1 p #

min :: V1 p -> V1 p -> V1 p #

(Ord k, Ord v) => Ord (Map k v) 
Instance details

Defined in Data.Map.Internal

Methods

compare :: Map k v -> Map k v -> Ordering #

(<) :: Map k v -> Map k v -> Bool #

(<=) :: Map k v -> Map k v -> Bool #

(>) :: Map k v -> Map k v -> Bool #

(>=) :: Map k v -> Map k v -> Bool #

max :: Map k v -> Map k v -> Map k v #

min :: Map k v -> Map k v -> Map k v #

(Ord1 f, Ord a) => Ord (Cofree f a) 
Instance details

Defined in Control.Comonad.Cofree

Methods

compare :: Cofree f a -> Cofree f a -> Ordering #

(<) :: Cofree f a -> Cofree f a -> Bool #

(<=) :: Cofree f a -> Cofree f a -> Bool #

(>) :: Cofree f a -> Cofree f a -> Bool #

(>=) :: Cofree f a -> Cofree f a -> Bool #

max :: Cofree f a -> Cofree f a -> Cofree f a #

min :: Cofree f a -> Cofree f a -> Cofree f a #

(Ord1 f, Ord a) => Ord (Free f a) 
Instance details

Defined in Control.Monad.Free

Methods

compare :: Free f a -> Free f a -> Ordering #

(<) :: Free f a -> Free f a -> Bool #

(<=) :: Free f a -> Free f a -> Bool #

(>) :: Free f a -> Free f a -> Bool #

(>=) :: Free f a -> Free f a -> Bool #

max :: Free f a -> Free f a -> Free f a #

min :: Free f a -> Free f a -> Free f a #

(Ord1 f, Ord a) => Ord (Yoneda f a) 
Instance details

Defined in Data.Functor.Yoneda

Methods

compare :: Yoneda f a -> Yoneda f a -> Ordering #

(<) :: Yoneda f a -> Yoneda f a -> Bool #

(<=) :: Yoneda f a -> Yoneda f a -> Bool #

(>) :: Yoneda f a -> Yoneda f a -> Bool #

(>=) :: Yoneda f a -> Yoneda f a -> Bool #

max :: Yoneda f a -> Yoneda f a -> Yoneda f a #

min :: Yoneda f a -> Yoneda f a -> Yoneda f a #

(Ord a, Ord b) => Ord (Either a b) 
Instance details

Defined in Data.Strict.Either

Methods

compare :: Either a b -> Either a b -> Ordering #

(<) :: Either a b -> Either a b -> Bool #

(<=) :: Either a b -> Either a b -> Bool #

(>) :: Either a b -> Either a b -> Bool #

(>=) :: Either a b -> Either a b -> Bool #

max :: Either a b -> Either a b -> Either a b #

min :: Either a b -> Either a b -> Either a b #

(Ord a, Ord b) => Ord (These a b) 
Instance details

Defined in Data.Strict.These

Methods

compare :: These a b -> These a b -> Ordering #

(<) :: These a b -> These a b -> Bool #

(<=) :: These a b -> These a b -> Bool #

(>) :: These a b -> These a b -> Bool #

(>=) :: These a b -> These a b -> Bool #

max :: These a b -> These a b -> These a b #

min :: These a b -> These a b -> These a b #

(Ord a, Ord b) => Ord (Pair a b) 
Instance details

Defined in Data.Strict.Tuple

Methods

compare :: Pair a b -> Pair a b -> Ordering #

(<) :: Pair a b -> Pair a b -> Bool #

(<=) :: Pair a b -> Pair a b -> Bool #

(>) :: Pair a b -> Pair a b -> Bool #

(>=) :: Pair a b -> Pair a b -> Bool #

max :: Pair a b -> Pair a b -> Pair a b #

min :: Pair a b -> Pair a b -> Pair a b #

(Ord a, Ord b) => Ord (These a b) 
Instance details

Defined in Data.These

Methods

compare :: These a b -> These a b -> Ordering #

(<) :: These a b -> These a b -> Bool #

(<=) :: These a b -> These a b -> Bool #

(>) :: These a b -> These a b -> Bool #

(>=) :: These a b -> These a b -> Bool #

max :: These a b -> These a b -> These a b #

min :: These a b -> These a b -> These a b #

(Ord1 f, Ord a) => Ord (Lift f a) 
Instance details

Defined in Control.Applicative.Lift

Methods

compare :: Lift f a -> Lift f a -> Ordering #

(<) :: Lift f a -> Lift f a -> Bool #

(<=) :: Lift f a -> Lift f a -> Bool #

(>) :: Lift f a -> Lift f a -> Bool #

(>=) :: Lift f a -> Lift f a -> Bool #

max :: Lift f a -> Lift f a -> Lift f a #

min :: Lift f a -> Lift f a -> Lift f a #

(Ord1 m, Ord a) => Ord (ListT m a) 
Instance details

Defined in Control.Monad.Trans.List

Methods

compare :: ListT m a -> ListT m a -> Ordering #

(<) :: ListT m a -> ListT m a -> Bool #

(<=) :: ListT m a -> ListT m a -> Bool #

(>) :: ListT m a -> ListT m a -> Bool #

(>=) :: ListT m a -> ListT m a -> Bool #

max :: ListT m a -> ListT m a -> ListT m a #

min :: ListT m a -> ListT m a -> ListT m a #

(Ord1 m, Ord a) => Ord (MaybeT m a) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

compare :: MaybeT m a -> MaybeT m a -> Ordering #

(<) :: MaybeT m a -> MaybeT m a -> Bool #

(<=) :: MaybeT m a -> MaybeT m a -> Bool #

(>) :: MaybeT m a -> MaybeT m a -> Bool #

(>=) :: MaybeT m a -> MaybeT m a -> Bool #

max :: MaybeT m a -> MaybeT m a -> MaybeT m a #

min :: MaybeT m a -> MaybeT m a -> MaybeT m a #

(Ord k, Ord v) => Ord (HashMap k v)

The ordering is total and consistent with the Eq instance. However, nothing else about the ordering is specified, and it may change from version to version of either this package or of hashable.

Instance details

Defined in Data.HashMap.Internal

Methods

compare :: HashMap k v -> HashMap k v -> Ordering #

(<) :: HashMap k v -> HashMap k v -> Bool #

(<=) :: HashMap k v -> HashMap k v -> Bool #

(>) :: HashMap k v -> HashMap k v -> Bool #

(>=) :: HashMap k v -> HashMap k v -> Bool #

max :: HashMap k v -> HashMap k v -> HashMap k v #

min :: HashMap k v -> HashMap k v -> HashMap k v #

(Ord a, Ord b) => Ord (a, b) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b) -> (a, b) -> Ordering #

(<) :: (a, b) -> (a, b) -> Bool #

(<=) :: (a, b) -> (a, b) -> Bool #

(>) :: (a, b) -> (a, b) -> Bool #

(>=) :: (a, b) -> (a, b) -> Bool #

max :: (a, b) -> (a, b) -> (a, b) #

min :: (a, b) -> (a, b) -> (a, b) #

Ord a => Ord (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

compare :: Const a b -> Const a b -> Ordering #

(<) :: Const a b -> Const a b -> Bool #

(<=) :: Const a b -> Const a b -> Bool #

(>) :: Const a b -> Const a b -> Bool #

(>=) :: Const a b -> Const a b -> Bool #

max :: Const a b -> Const a b -> Const a b #

min :: Const a b -> Const a b -> Const a b #

Ord (f a) => Ord (Ap f a)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

compare :: Ap f a -> Ap f a -> Ordering #

(<) :: Ap f a -> Ap f a -> Bool #

(<=) :: Ap f a -> Ap f a -> Bool #

(>) :: Ap f a -> Ap f a -> Bool #

(>=) :: Ap f a -> Ap f a -> Bool #

max :: Ap f a -> Ap f a -> Ap f a #

min :: Ap f a -> Ap f a -> Ap f a #

Ord (f a) => Ord (Alt f a)

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

compare :: Alt f a -> Alt f a -> Ordering #

(<) :: Alt f a -> Alt f a -> Bool #

(<=) :: Alt f a -> Alt f a -> Bool #

(>) :: Alt f a -> Alt f a -> Bool #

(>=) :: Alt f a -> Alt f a -> Bool #

max :: Alt f a -> Alt f a -> Alt f a #

min :: Alt f a -> Alt f a -> Alt f a #

Ord (a :~: b)

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Equality

Methods

compare :: (a :~: b) -> (a :~: b) -> Ordering #

(<) :: (a :~: b) -> (a :~: b) -> Bool #

(<=) :: (a :~: b) -> (a :~: b) -> Bool #

(>) :: (a :~: b) -> (a :~: b) -> Bool #

(>=) :: (a :~: b) -> (a :~: b) -> Bool #

max :: (a :~: b) -> (a :~: b) -> a :~: b #

min :: (a :~: b) -> (a :~: b) -> a :~: b #

Ord (f p) => Ord (Rec1 f p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: Rec1 f p -> Rec1 f p -> Ordering #

(<) :: Rec1 f p -> Rec1 f p -> Bool #

(<=) :: Rec1 f p -> Rec1 f p -> Bool #

(>) :: Rec1 f p -> Rec1 f p -> Bool #

(>=) :: Rec1 f p -> Rec1 f p -> Bool #

max :: Rec1 f p -> Rec1 f p -> Rec1 f p #

min :: Rec1 f p -> Rec1 f p -> Rec1 f p #

Ord (URec (Ptr ()) p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: URec (Ptr ()) p -> URec (Ptr ()) p -> Ordering #

(<) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool #

(<=) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool #

(>) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool #

(>=) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool #

max :: URec (Ptr ()) p -> URec (Ptr ()) p -> URec (Ptr ()) p #

min :: URec (Ptr ()) p -> URec (Ptr ()) p -> URec (Ptr ()) p #

Ord (URec Char p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: URec Char p -> URec Char p -> Ordering #

(<) :: URec Char p -> URec Char p -> Bool #

(<=) :: URec Char p -> URec Char p -> Bool #

(>) :: URec Char p -> URec Char p -> Bool #

(>=) :: URec Char p -> URec Char p -> Bool #

max :: URec Char p -> URec Char p -> URec Char p #

min :: URec Char p -> URec Char p -> URec Char p #

Ord (URec Double p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: URec Double p -> URec Double p -> Ordering #

(<) :: URec Double p -> URec Double p -> Bool #

(<=) :: URec Double p -> URec Double p -> Bool #

(>) :: URec Double p -> URec Double p -> Bool #

(>=) :: URec Double p -> URec Double p -> Bool #

max :: URec Double p -> URec Double p -> URec Double p #

min :: URec Double p -> URec Double p -> URec Double p #

Ord (URec Float p) 
Instance details

Defined in GHC.Generics

Methods

compare :: URec Float p -> URec Float p -> Ordering #

(<) :: URec Float p -> URec Float p -> Bool #

(<=) :: URec Float p -> URec Float p -> Bool #

(>) :: URec Float p -> URec Float p -> Bool #

(>=) :: URec Float p -> URec Float p -> Bool #

max :: URec Float p -> URec Float p -> URec Float p #

min :: URec Float p -> URec Float p -> URec Float p #

Ord (URec Int p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: URec Int p -> URec Int p -> Ordering #

(<) :: URec Int p -> URec Int p -> Bool #

(<=) :: URec Int p -> URec Int p -> Bool #

(>) :: URec Int p -> URec Int p -> Bool #

(>=) :: URec Int p -> URec Int p -> Bool #

max :: URec Int p -> URec Int p -> URec Int p #

min :: URec Int p -> URec Int p -> URec Int p #

Ord (URec Word p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: URec Word p -> URec Word p -> Ordering #

(<) :: URec Word p -> URec Word p -> Bool #

(<=) :: URec Word p -> URec Word p -> Bool #

(>) :: URec Word p -> URec Word p -> Bool #

(>=) :: URec Word p -> URec Word p -> Bool #

max :: URec Word p -> URec Word p -> URec Word p #

min :: URec Word p -> URec Word p -> URec Word p #

Ord (p (Fix p a) a) => Ord (Fix p a) 
Instance details

Defined in Data.Bifunctor.Fix

Methods

compare :: Fix p a -> Fix p a -> Ordering #

(<) :: Fix p a -> Fix p a -> Bool #

(<=) :: Fix p a -> Fix p a -> Bool #

(>) :: Fix p a -> Fix p a -> Bool #

(>=) :: Fix p a -> Fix p a -> Bool #

max :: Fix p a -> Fix p a -> Fix p a #

min :: Fix p a -> Fix p a -> Fix p a #

Ord (p a a) => Ord (Join p a) 
Instance details

Defined in Data.Bifunctor.Join

Methods

compare :: Join p a -> Join p a -> Ordering #

(<) :: Join p a -> Join p a -> Bool #

(<=) :: Join p a -> Join p a -> Bool #

(>) :: Join p a -> Join p a -> Bool #

(>=) :: Join p a -> Join p a -> Bool #

max :: Join p a -> Join p a -> Join p a #

min :: Join p a -> Join p a -> Join p a #

(Ord a, Ord (f b)) => Ord (CofreeF f a b) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

compare :: CofreeF f a b -> CofreeF f a b -> Ordering #

(<) :: CofreeF f a b -> CofreeF f a b -> Bool #

(<=) :: CofreeF f a b -> CofreeF f a b -> Bool #

(>) :: CofreeF f a b -> CofreeF f a b -> Bool #

(>=) :: CofreeF f a b -> CofreeF f a b -> Bool #

max :: CofreeF f a b -> CofreeF f a b -> CofreeF f a b #

min :: CofreeF f a b -> CofreeF f a b -> CofreeF f a b #

Ord (w (CofreeF f a (CofreeT f w a))) => Ord (CofreeT f w a) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

compare :: CofreeT f w a -> CofreeT f w a -> Ordering #

(<) :: CofreeT f w a -> CofreeT f w a -> Bool #

(<=) :: CofreeT f w a -> CofreeT f w a -> Bool #

(>) :: CofreeT f w a -> CofreeT f w a -> Bool #

(>=) :: CofreeT f w a -> CofreeT f w a -> Bool #

max :: CofreeT f w a -> CofreeT f w a -> CofreeT f w a #

min :: CofreeT f w a -> CofreeT f w a -> CofreeT f w a #

(Ord a, Ord (f b)) => Ord (FreeF f a b) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

compare :: FreeF f a b -> FreeF f a b -> Ordering #

(<) :: FreeF f a b -> FreeF f a b -> Bool #

(<=) :: FreeF f a b -> FreeF f a b -> Bool #

(>) :: FreeF f a b -> FreeF f a b -> Bool #

(>=) :: FreeF f a b -> FreeF f a b -> Bool #

max :: FreeF f a b -> FreeF f a b -> FreeF f a b #

min :: FreeF f a b -> FreeF f a b -> FreeF f a b #

(Ord1 f, Ord1 m, Ord a) => Ord (FreeT f m a) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

compare :: FreeT f m a -> FreeT f m a -> Ordering #

(<) :: FreeT f m a -> FreeT f m a -> Bool #

(<=) :: FreeT f m a -> FreeT f m a -> Bool #

(>) :: FreeT f m a -> FreeT f m a -> Bool #

(>=) :: FreeT f m a -> FreeT f m a -> Bool #

max :: FreeT f m a -> FreeT f m a -> FreeT f m a #

min :: FreeT f m a -> FreeT f m a -> FreeT f m a #

Ord b => Ord (Tagged s b) 
Instance details

Defined in Data.Tagged

Methods

compare :: Tagged s b -> Tagged s b -> Ordering #

(<) :: Tagged s b -> Tagged s b -> Bool #

(<=) :: Tagged s b -> Tagged s b -> Bool #

(>) :: Tagged s b -> Tagged s b -> Bool #

(>=) :: Tagged s b -> Tagged s b -> Bool #

max :: Tagged s b -> Tagged s b -> Tagged s b #

min :: Tagged s b -> Tagged s b -> Tagged s b #

(Ord (f a), Ord (g a), Ord a) => Ord (These1 f g a) 
Instance details

Defined in Data.Functor.These

Methods

compare :: These1 f g a -> These1 f g a -> Ordering #

(<) :: These1 f g a -> These1 f g a -> Bool #

(<=) :: These1 f g a -> These1 f g a -> Bool #

(>) :: These1 f g a -> These1 f g a -> Bool #

(>=) :: These1 f g a -> These1 f g a -> Bool #

max :: These1 f g a -> These1 f g a -> These1 f g a #

min :: These1 f g a -> These1 f g a -> These1 f g a #

(Ord1 f, Ord a) => Ord (Backwards f a) 
Instance details

Defined in Control.Applicative.Backwards

Methods

compare :: Backwards f a -> Backwards f a -> Ordering #

(<) :: Backwards f a -> Backwards f a -> Bool #

(<=) :: Backwards f a -> Backwards f a -> Bool #

(>) :: Backwards f a -> Backwards f a -> Bool #

(>=) :: Backwards f a -> Backwards f a -> Bool #

max :: Backwards f a -> Backwards f a -> Backwards f a #

min :: Backwards f a -> Backwards f a -> Backwards f a #

(Ord e, Ord1 m, Ord a) => Ord (ErrorT e m a) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

compare :: ErrorT e m a -> ErrorT e m a -> Ordering #

(<) :: ErrorT e m a -> ErrorT e m a -> Bool #

(<=) :: ErrorT e m a -> ErrorT e m a -> Bool #

(>) :: ErrorT e m a -> ErrorT e m a -> Bool #

(>=) :: ErrorT e m a -> ErrorT e m a -> Bool #

max :: ErrorT e m a -> ErrorT e m a -> ErrorT e m a #

min :: ErrorT e m a -> ErrorT e m a -> ErrorT e m a #

(Ord e, Ord1 m, Ord a) => Ord (ExceptT e m a) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

compare :: ExceptT e m a -> ExceptT e m a -> Ordering #

(<) :: ExceptT e m a -> ExceptT e m a -> Bool #

(<=) :: ExceptT e m a -> ExceptT e m a -> Bool #

(>) :: ExceptT e m a -> ExceptT e m a -> Bool #

(>=) :: ExceptT e m a -> ExceptT e m a -> Bool #

max :: ExceptT e m a -> ExceptT e m a -> ExceptT e m a #

min :: ExceptT e m a -> ExceptT e m a -> ExceptT e m a #

(Ord1 f, Ord a) => Ord (IdentityT f a) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

compare :: IdentityT f a -> IdentityT f a -> Ordering #

(<) :: IdentityT f a -> IdentityT f a -> Bool #

(<=) :: IdentityT f a -> IdentityT f a -> Bool #

(>) :: IdentityT f a -> IdentityT f a -> Bool #

(>=) :: IdentityT f a -> IdentityT f a -> Bool #

max :: IdentityT f a -> IdentityT f a -> IdentityT f a #

min :: IdentityT f a -> IdentityT f a -> IdentityT f a #

(Ord w, Ord1 m, Ord a) => Ord (WriterT w m a) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

compare :: WriterT w m a -> WriterT w m a -> Ordering #

(<) :: WriterT w m a -> WriterT w m a -> Bool #

(<=) :: WriterT w m a -> WriterT w m a -> Bool #

(>) :: WriterT w m a -> WriterT w m a -> Bool #

(>=) :: WriterT w m a -> WriterT w m a -> Bool #

max :: WriterT w m a -> WriterT w m a -> WriterT w m a #

min :: WriterT w m a -> WriterT w m a -> WriterT w m a #

(Ord w, Ord1 m, Ord a) => Ord (WriterT w m a) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

compare :: WriterT w m a -> WriterT w m a -> Ordering #

(<) :: WriterT w m a -> WriterT w m a -> Bool #

(<=) :: WriterT w m a -> WriterT w m a -> Bool #

(>) :: WriterT w m a -> WriterT w m a -> Bool #

(>=) :: WriterT w m a -> WriterT w m a -> Bool #

max :: WriterT w m a -> WriterT w m a -> WriterT w m a #

min :: WriterT w m a -> WriterT w m a -> WriterT w m a #

Ord a => Ord (Constant a b) 
Instance details

Defined in Data.Functor.Constant

Methods

compare :: Constant a b -> Constant a b -> Ordering #

(<) :: Constant a b -> Constant a b -> Bool #

(<=) :: Constant a b -> Constant a b -> Bool #

(>) :: Constant a b -> Constant a b -> Bool #

(>=) :: Constant a b -> Constant a b -> Bool #

max :: Constant a b -> Constant a b -> Constant a b #

min :: Constant a b -> Constant a b -> Constant a b #

(Ord1 f, Ord a) => Ord (Reverse f a) 
Instance details

Defined in Data.Functor.Reverse

Methods

compare :: Reverse f a -> Reverse f a -> Ordering #

(<) :: Reverse f a -> Reverse f a -> Bool #

(<=) :: Reverse f a -> Reverse f a -> Bool #

(>) :: Reverse f a -> Reverse f a -> Bool #

(>=) :: Reverse f a -> Reverse f a -> Bool #

max :: Reverse f a -> Reverse f a -> Reverse f a #

min :: Reverse f a -> Reverse f a -> Reverse f a #

(Ord a, Ord b, Ord c) => Ord (a, b, c) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c) -> (a, b, c) -> Ordering #

(<) :: (a, b, c) -> (a, b, c) -> Bool #

(<=) :: (a, b, c) -> (a, b, c) -> Bool #

(>) :: (a, b, c) -> (a, b, c) -> Bool #

(>=) :: (a, b, c) -> (a, b, c) -> Bool #

max :: (a, b, c) -> (a, b, c) -> (a, b, c) #

min :: (a, b, c) -> (a, b, c) -> (a, b, c) #

(Ord1 f, Ord1 g, Ord a) => Ord (Product f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Product

Methods

compare :: Product f g a -> Product f g a -> Ordering #

(<) :: Product f g a -> Product f g a -> Bool #

(<=) :: Product f g a -> Product f g a -> Bool #

(>) :: Product f g a -> Product f g a -> Bool #

(>=) :: Product f g a -> Product f g a -> Bool #

max :: Product f g a -> Product f g a -> Product f g a #

min :: Product f g a -> Product f g a -> Product f g a #

(Ord1 f, Ord1 g, Ord a) => Ord (Sum f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Sum

Methods

compare :: Sum f g a -> Sum f g a -> Ordering #

(<) :: Sum f g a -> Sum f g a -> Bool #

(<=) :: Sum f g a -> Sum f g a -> Bool #

(>) :: Sum f g a -> Sum f g a -> Bool #

(>=) :: Sum f g a -> Sum f g a -> Bool #

max :: Sum f g a -> Sum f g a -> Sum f g a #

min :: Sum f g a -> Sum f g a -> Sum f g a #

Ord (a :~~: b)

Since: base-4.10.0.0

Instance details

Defined in Data.Type.Equality

Methods

compare :: (a :~~: b) -> (a :~~: b) -> Ordering #

(<) :: (a :~~: b) -> (a :~~: b) -> Bool #

(<=) :: (a :~~: b) -> (a :~~: b) -> Bool #

(>) :: (a :~~: b) -> (a :~~: b) -> Bool #

(>=) :: (a :~~: b) -> (a :~~: b) -> Bool #

max :: (a :~~: b) -> (a :~~: b) -> a :~~: b #

min :: (a :~~: b) -> (a :~~: b) -> a :~~: b #

(Ord (f p), Ord (g p)) => Ord ((f :*: g) p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: (f :*: g) p -> (f :*: g) p -> Ordering #

(<) :: (f :*: g) p -> (f :*: g) p -> Bool #

(<=) :: (f :*: g) p -> (f :*: g) p -> Bool #

(>) :: (f :*: g) p -> (f :*: g) p -> Bool #

(>=) :: (f :*: g) p -> (f :*: g) p -> Bool #

max :: (f :*: g) p -> (f :*: g) p -> (f :*: g) p #

min :: (f :*: g) p -> (f :*: g) p -> (f :*: g) p #

(Ord (f p), Ord (g p)) => Ord ((f :+: g) p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: (f :+: g) p -> (f :+: g) p -> Ordering #

(<) :: (f :+: g) p -> (f :+: g) p -> Bool #

(<=) :: (f :+: g) p -> (f :+: g) p -> Bool #

(>) :: (f :+: g) p -> (f :+: g) p -> Bool #

(>=) :: (f :+: g) p -> (f :+: g) p -> Bool #

max :: (f :+: g) p -> (f :+: g) p -> (f :+: g) p #

min :: (f :+: g) p -> (f :+: g) p -> (f :+: g) p #

Ord c => Ord (K1 i c p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: K1 i c p -> K1 i c p -> Ordering #

(<) :: K1 i c p -> K1 i c p -> Bool #

(<=) :: K1 i c p -> K1 i c p -> Bool #

(>) :: K1 i c p -> K1 i c p -> Bool #

(>=) :: K1 i c p -> K1 i c p -> Bool #

max :: K1 i c p -> K1 i c p -> K1 i c p #

min :: K1 i c p -> K1 i c p -> K1 i c p #

(Ord a, Ord b, Ord c, Ord d) => Ord (a, b, c, d) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d) -> (a, b, c, d) -> Ordering #

(<) :: (a, b, c, d) -> (a, b, c, d) -> Bool #

(<=) :: (a, b, c, d) -> (a, b, c, d) -> Bool #

(>) :: (a, b, c, d) -> (a, b, c, d) -> Bool #

(>=) :: (a, b, c, d) -> (a, b, c, d) -> Bool #

max :: (a, b, c, d) -> (a, b, c, d) -> (a, b, c, d) #

min :: (a, b, c, d) -> (a, b, c, d) -> (a, b, c, d) #

(Ord1 f, Ord1 g, Ord a) => Ord (Compose f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

compare :: Compose f g a -> Compose f g a -> Ordering #

(<) :: Compose f g a -> Compose f g a -> Bool #

(<=) :: Compose f g a -> Compose f g a -> Bool #

(>) :: Compose f g a -> Compose f g a -> Bool #

(>=) :: Compose f g a -> Compose f g a -> Bool #

max :: Compose f g a -> Compose f g a -> Compose f g a #

min :: Compose f g a -> Compose f g a -> Compose f g a #

Ord (f (g p)) => Ord ((f :.: g) p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: (f :.: g) p -> (f :.: g) p -> Ordering #

(<) :: (f :.: g) p -> (f :.: g) p -> Bool #

(<=) :: (f :.: g) p -> (f :.: g) p -> Bool #

(>) :: (f :.: g) p -> (f :.: g) p -> Bool #

(>=) :: (f :.: g) p -> (f :.: g) p -> Bool #

max :: (f :.: g) p -> (f :.: g) p -> (f :.: g) p #

min :: (f :.: g) p -> (f :.: g) p -> (f :.: g) p #

Ord (f p) => Ord (M1 i c f p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: M1 i c f p -> M1 i c f p -> Ordering #

(<) :: M1 i c f p -> M1 i c f p -> Bool #

(<=) :: M1 i c f p -> M1 i c f p -> Bool #

(>) :: M1 i c f p -> M1 i c f p -> Bool #

(>=) :: M1 i c f p -> M1 i c f p -> Bool #

max :: M1 i c f p -> M1 i c f p -> M1 i c f p #

min :: M1 i c f p -> M1 i c f p -> M1 i c f p #

Ord (f a) => Ord (Clown f a b) 
Instance details

Defined in Data.Bifunctor.Clown

Methods

compare :: Clown f a b -> Clown f a b -> Ordering #

(<) :: Clown f a b -> Clown f a b -> Bool #

(<=) :: Clown f a b -> Clown f a b -> Bool #

(>) :: Clown f a b -> Clown f a b -> Bool #

(>=) :: Clown f a b -> Clown f a b -> Bool #

max :: Clown f a b -> Clown f a b -> Clown f a b #

min :: Clown f a b -> Clown f a b -> Clown f a b #

Ord (p b a) => Ord (Flip p a b) 
Instance details

Defined in Data.Bifunctor.Flip

Methods

compare :: Flip p a b -> Flip p a b -> Ordering #

(<) :: Flip p a b -> Flip p a b -> Bool #

(<=) :: Flip p a b -> Flip p a b -> Bool #

(>) :: Flip p a b -> Flip p a b -> Bool #

(>=) :: Flip p a b -> Flip p a b -> Bool #

max :: Flip p a b -> Flip p a b -> Flip p a b #

min :: Flip p a b -> Flip p a b -> Flip p a b #

Ord (g b) => Ord (Joker g a b) 
Instance details

Defined in Data.Bifunctor.Joker

Methods

compare :: Joker g a b -> Joker g a b -> Ordering #

(<) :: Joker g a b -> Joker g a b -> Bool #

(<=) :: Joker g a b -> Joker g a b -> Bool #

(>) :: Joker g a b -> Joker g a b -> Bool #

(>=) :: Joker g a b -> Joker g a b -> Bool #

max :: Joker g a b -> Joker g a b -> Joker g a b #

min :: Joker g a b -> Joker g a b -> Joker g a b #

Ord (p a b) => Ord (WrappedBifunctor p a b) 
Instance details

Defined in Data.Bifunctor.Wrapped

(Ord a, Ord b, Ord c, Ord d, Ord e) => Ord (a, b, c, d, e) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d, e) -> (a, b, c, d, e) -> Ordering #

(<) :: (a, b, c, d, e) -> (a, b, c, d, e) -> Bool #

(<=) :: (a, b, c, d, e) -> (a, b, c, d, e) -> Bool #

(>) :: (a, b, c, d, e) -> (a, b, c, d, e) -> Bool #

(>=) :: (a, b, c, d, e) -> (a, b, c, d, e) -> Bool #

max :: (a, b, c, d, e) -> (a, b, c, d, e) -> (a, b, c, d, e) #

min :: (a, b, c, d, e) -> (a, b, c, d, e) -> (a, b, c, d, e) #

(Ord (f a b), Ord (g a b)) => Ord (Product f g a b) 
Instance details

Defined in Data.Bifunctor.Product

Methods

compare :: Product f g a b -> Product f g a b -> Ordering #

(<) :: Product f g a b -> Product f g a b -> Bool #

(<=) :: Product f g a b -> Product f g a b -> Bool #

(>) :: Product f g a b -> Product f g a b -> Bool #

(>=) :: Product f g a b -> Product f g a b -> Bool #

max :: Product f g a b -> Product f g a b -> Product f g a b #

min :: Product f g a b -> Product f g a b -> Product f g a b #

(Ord (p a b), Ord (q a b)) => Ord (Sum p q a b) 
Instance details

Defined in Data.Bifunctor.Sum

Methods

compare :: Sum p q a b -> Sum p q a b -> Ordering #

(<) :: Sum p q a b -> Sum p q a b -> Bool #

(<=) :: Sum p q a b -> Sum p q a b -> Bool #

(>) :: Sum p q a b -> Sum p q a b -> Bool #

(>=) :: Sum p q a b -> Sum p q a b -> Bool #

max :: Sum p q a b -> Sum p q a b -> Sum p q a b #

min :: Sum p q a b -> Sum p q a b -> Sum p q a b #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f) => Ord (a, b, c, d, e, f) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> Ordering #

(<) :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> Bool #

(<=) :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> Bool #

(>) :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> Bool #

(>=) :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> Bool #

max :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> (a, b, c, d, e, f) #

min :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> (a, b, c, d, e, f) #

Ord (f (p a b)) => Ord (Tannen f p a b) 
Instance details

Defined in Data.Bifunctor.Tannen

Methods

compare :: Tannen f p a b -> Tannen f p a b -> Ordering #

(<) :: Tannen f p a b -> Tannen f p a b -> Bool #

(<=) :: Tannen f p a b -> Tannen f p a b -> Bool #

(>) :: Tannen f p a b -> Tannen f p a b -> Bool #

(>=) :: Tannen f p a b -> Tannen f p a b -> Bool #

max :: Tannen f p a b -> Tannen f p a b -> Tannen f p a b #

min :: Tannen f p a b -> Tannen f p a b -> Tannen f p a b #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g) => Ord (a, b, c, d, e, f, g) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> Ordering #

(<) :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> Bool #

(<=) :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> Bool #

(>) :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> Bool #

(>=) :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> Bool #

max :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) #

min :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h) => Ord (a, b, c, d, e, f, g, h) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> Ordering #

(<) :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> Bool #

(<=) :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> Bool #

(>) :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> Bool #

(>=) :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> Bool #

max :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) #

min :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) #

Ord (p (f a) (g b)) => Ord (Biff p f g a b) 
Instance details

Defined in Data.Bifunctor.Biff

Methods

compare :: Biff p f g a b -> Biff p f g a b -> Ordering #

(<) :: Biff p f g a b -> Biff p f g a b -> Bool #

(<=) :: Biff p f g a b -> Biff p f g a b -> Bool #

(>) :: Biff p f g a b -> Biff p f g a b -> Bool #

(>=) :: Biff p f g a b -> Biff p f g a b -> Bool #

max :: Biff p f g a b -> Biff p f g a b -> Biff p f g a b #

min :: Biff p f g a b -> Biff p f g a b -> Biff p f g a b #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i) => Ord (a, b, c, d, e, f, g, h, i) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> Ordering #

(<) :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> Bool #

(<=) :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> Bool #

(>) :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> Bool #

(>=) :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> Bool #

max :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) #

min :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j) => Ord (a, b, c, d, e, f, g, h, i, j) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> Ordering #

(<) :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> Bool #

(<=) :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> Bool #

(>) :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> Bool #

(>=) :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> Bool #

max :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) #

min :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j, Ord k) => Ord (a, b, c, d, e, f, g, h, i, j, k) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> Ordering #

(<) :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> Bool #

(<=) :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> Bool #

(>) :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> Bool #

(>=) :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> Bool #

max :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) #

min :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j, Ord k, Ord l) => Ord (a, b, c, d, e, f, g, h, i, j, k, l) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> Ordering #

(<) :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> Bool #

(<=) :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> Bool #

(>) :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> Bool #

(>=) :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> Bool #

max :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) #

min :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j, Ord k, Ord l, Ord m) => Ord (a, b, c, d, e, f, g, h, i, j, k, l, m) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Ordering #

(<) :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Bool #

(<=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Bool #

(>) :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Bool #

(>=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Bool #

max :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) #

min :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j, Ord k, Ord l, Ord m, Ord n) => Ord (a, b, c, d, e, f, g, h, i, j, k, l, m, n) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Ordering #

(<) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Bool #

(<=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Bool #

(>) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Bool #

(>=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Bool #

max :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) #

min :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j, Ord k, Ord l, Ord m, Ord n, Ord o) => Ord (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Ordering #

(<) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Bool #

(<=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Bool #

(>) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Bool #

(>=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Bool #

max :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) #

min :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) #

class Read a #

Parsing of Strings, producing values.

Derived instances of Read make the following assumptions, which derived instances of Show obey:

  • If the constructor is defined to be an infix operator, then the derived Read instance will parse only infix applications of the constructor (not the prefix form).
  • Associativity is not used to reduce the occurrence of parentheses, although precedence may be.
  • If the constructor is defined using record syntax, the derived Read will parse only the record-syntax form, and furthermore, the fields must be given in the same order as the original declaration.
  • The derived Read instance allows arbitrary Haskell whitespace between tokens of the input string. Extra parentheses are also allowed.

For example, given the declarations

infixr 5 :^:
data Tree a =  Leaf a  |  Tree a :^: Tree a

the derived instance of Read in Haskell 2010 is equivalent to

instance (Read a) => Read (Tree a) where

        readsPrec d r =  readParen (d > app_prec)
                         (\r -> [(Leaf m,t) |
                                 ("Leaf",s) <- lex r,
                                 (m,t) <- readsPrec (app_prec+1) s]) r

                      ++ readParen (d > up_prec)
                         (\r -> [(u:^:v,w) |
                                 (u,s) <- readsPrec (up_prec+1) r,
                                 (":^:",t) <- lex s,
                                 (v,w) <- readsPrec (up_prec+1) t]) r

          where app_prec = 10
                up_prec = 5

Note that right-associativity of :^: is unused.

The derived instance in GHC is equivalent to

instance (Read a) => Read (Tree a) where

        readPrec = parens $ (prec app_prec $ do
                                 Ident "Leaf" <- lexP
                                 m <- step readPrec
                                 return (Leaf m))

                     +++ (prec up_prec $ do
                                 u <- step readPrec
                                 Symbol ":^:" <- lexP
                                 v <- step readPrec
                                 return (u :^: v))

          where app_prec = 10
                up_prec = 5

        readListPrec = readListPrecDefault

Why do both readsPrec and readPrec exist, and why does GHC opt to implement readPrec in derived Read instances instead of readsPrec? The reason is that readsPrec is based on the ReadS type, and although ReadS is mentioned in the Haskell 2010 Report, it is not a very efficient parser data structure.

readPrec, on the other hand, is based on a much more efficient ReadPrec datatype (a.k.a "new-style parsers"), but its definition relies on the use of the RankNTypes language extension. Therefore, readPrec (and its cousin, readListPrec) are marked as GHC-only. Nevertheless, it is recommended to use readPrec instead of readsPrec whenever possible for the efficiency improvements it brings.

As mentioned above, derived Read instances in GHC will implement readPrec instead of readsPrec. The default implementations of readsPrec (and its cousin, readList) will simply use readPrec under the hood. If you are writing a Read instance by hand, it is recommended to write it like so:

instance Read T where
  readPrec     = ...
  readListPrec = readListPrecDefault

Minimal complete definition

readsPrec | readPrec

Instances

Instances details
Read CompOptions 
Instance details

Defined in System.FilePath.Glob.Base

Read Pattern 
Instance details

Defined in System.FilePath.Glob.Base

Read ASCIIString 
Instance details

Defined in Test.QuickCheck.Modifiers

Read PrintableString 
Instance details

Defined in Test.QuickCheck.Modifiers

Read UnicodeString 
Instance details

Defined in Test.QuickCheck.Modifiers

Read Args 
Instance details

Defined in Test.QuickCheck.Test

Read Key 
Instance details

Defined in Data.Aeson.Key

Read DotNetTime 
Instance details

Defined in Data.Aeson.Types.Internal

Read Value 
Instance details

Defined in Data.Aeson.Types.Internal

Read ActivateType 
Instance details

Defined in Amazonka.CloudFormation.ActivateType

Read ActivateTypeResponse 
Instance details

Defined in Amazonka.CloudFormation.ActivateType

Read BatchDescribeTypeConfigurations 
Instance details

Defined in Amazonka.CloudFormation.BatchDescribeTypeConfigurations

Read BatchDescribeTypeConfigurationsResponse 
Instance details

Defined in Amazonka.CloudFormation.BatchDescribeTypeConfigurations

Read CancelUpdateStack 
Instance details

Defined in Amazonka.CloudFormation.CancelUpdateStack

Read CancelUpdateStackResponse 
Instance details

Defined in Amazonka.CloudFormation.CancelUpdateStack

Read ContinueUpdateRollback 
Instance details

Defined in Amazonka.CloudFormation.ContinueUpdateRollback

Read ContinueUpdateRollbackResponse 
Instance details

Defined in Amazonka.CloudFormation.ContinueUpdateRollback

Read CreateChangeSet 
Instance details

Defined in Amazonka.CloudFormation.CreateChangeSet

Read CreateChangeSetResponse 
Instance details

Defined in Amazonka.CloudFormation.CreateChangeSet

Read CreateStack 
Instance details

Defined in Amazonka.CloudFormation.CreateStack

Read CreateStackResponse 
Instance details

Defined in Amazonka.CloudFormation.CreateStack

Read CreateStackInstances 
Instance details

Defined in Amazonka.CloudFormation.CreateStackInstances

Read CreateStackInstancesResponse 
Instance details

Defined in Amazonka.CloudFormation.CreateStackInstances

Read CreateStackSet 
Instance details

Defined in Amazonka.CloudFormation.CreateStackSet

Read CreateStackSetResponse 
Instance details

Defined in Amazonka.CloudFormation.CreateStackSet

Read DeactivateType 
Instance details

Defined in Amazonka.CloudFormation.DeactivateType

Read DeactivateTypeResponse 
Instance details

Defined in Amazonka.CloudFormation.DeactivateType

Read DeleteChangeSet 
Instance details

Defined in Amazonka.CloudFormation.DeleteChangeSet

Read DeleteChangeSetResponse 
Instance details

Defined in Amazonka.CloudFormation.DeleteChangeSet

Read DeleteStack 
Instance details

Defined in Amazonka.CloudFormation.DeleteStack

Read DeleteStackResponse 
Instance details

Defined in Amazonka.CloudFormation.DeleteStack

Read DeleteStackInstances 
Instance details

Defined in Amazonka.CloudFormation.DeleteStackInstances

Read DeleteStackInstancesResponse 
Instance details

Defined in Amazonka.CloudFormation.DeleteStackInstances

Read DeleteStackSet 
Instance details

Defined in Amazonka.CloudFormation.DeleteStackSet

Read DeleteStackSetResponse 
Instance details

Defined in Amazonka.CloudFormation.DeleteStackSet

Read DeregisterType 
Instance details

Defined in Amazonka.CloudFormation.DeregisterType

Read DeregisterTypeResponse 
Instance details

Defined in Amazonka.CloudFormation.DeregisterType

Read DescribeAccountLimits 
Instance details

Defined in Amazonka.CloudFormation.DescribeAccountLimits

Read DescribeAccountLimitsResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeAccountLimits

Read DescribeChangeSet 
Instance details

Defined in Amazonka.CloudFormation.DescribeChangeSet

Read DescribeChangeSetResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeChangeSet

Read DescribeChangeSetHooks 
Instance details

Defined in Amazonka.CloudFormation.DescribeChangeSetHooks

Read DescribeChangeSetHooksResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeChangeSetHooks

Read DescribePublisher 
Instance details

Defined in Amazonka.CloudFormation.DescribePublisher

Read DescribePublisherResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribePublisher

Read DescribeStackDriftDetectionStatus 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackDriftDetectionStatus

Read DescribeStackDriftDetectionStatusResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackDriftDetectionStatus

Read DescribeStackEvents 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackEvents

Read DescribeStackEventsResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackEvents

Read DescribeStackInstance 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackInstance

Read DescribeStackInstanceResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackInstance

Read DescribeStackResource 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackResource

Read DescribeStackResourceResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackResource

Read DescribeStackResourceDrifts 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackResourceDrifts

Read DescribeStackResourceDriftsResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackResourceDrifts

Read DescribeStackResources 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackResources

Read DescribeStackResourcesResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackResources

Read DescribeStackSet 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackSet

Read DescribeStackSetResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackSet

Read DescribeStackSetOperation 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackSetOperation

Read DescribeStackSetOperationResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackSetOperation

Read DescribeStacks 
Instance details

Defined in Amazonka.CloudFormation.DescribeStacks

Read DescribeStacksResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStacks

Read DescribeType 
Instance details

Defined in Amazonka.CloudFormation.DescribeType

Read DescribeTypeResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeType

Read DescribeTypeRegistration 
Instance details

Defined in Amazonka.CloudFormation.DescribeTypeRegistration

Read DescribeTypeRegistrationResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeTypeRegistration

Read DetectStackDrift 
Instance details

Defined in Amazonka.CloudFormation.DetectStackDrift

Read DetectStackDriftResponse 
Instance details

Defined in Amazonka.CloudFormation.DetectStackDrift

Read DetectStackResourceDrift 
Instance details

Defined in Amazonka.CloudFormation.DetectStackResourceDrift

Read DetectStackResourceDriftResponse 
Instance details

Defined in Amazonka.CloudFormation.DetectStackResourceDrift

Read DetectStackSetDrift 
Instance details

Defined in Amazonka.CloudFormation.DetectStackSetDrift

Read DetectStackSetDriftResponse 
Instance details

Defined in Amazonka.CloudFormation.DetectStackSetDrift

Read EstimateTemplateCost 
Instance details

Defined in Amazonka.CloudFormation.EstimateTemplateCost

Read EstimateTemplateCostResponse 
Instance details

Defined in Amazonka.CloudFormation.EstimateTemplateCost

Read ExecuteChangeSet 
Instance details

Defined in Amazonka.CloudFormation.ExecuteChangeSet

Read ExecuteChangeSetResponse 
Instance details

Defined in Amazonka.CloudFormation.ExecuteChangeSet

Read GetStackPolicy 
Instance details

Defined in Amazonka.CloudFormation.GetStackPolicy

Read GetStackPolicyResponse 
Instance details

Defined in Amazonka.CloudFormation.GetStackPolicy

Read GetTemplate 
Instance details

Defined in Amazonka.CloudFormation.GetTemplate

Read GetTemplateResponse 
Instance details

Defined in Amazonka.CloudFormation.GetTemplate

Read GetTemplateSummary 
Instance details

Defined in Amazonka.CloudFormation.GetTemplateSummary

Read GetTemplateSummaryResponse 
Instance details

Defined in Amazonka.CloudFormation.GetTemplateSummary

Read ImportStacksToStackSet 
Instance details

Defined in Amazonka.CloudFormation.ImportStacksToStackSet

Read ImportStacksToStackSetResponse 
Instance details

Defined in Amazonka.CloudFormation.ImportStacksToStackSet

Read ListChangeSets 
Instance details

Defined in Amazonka.CloudFormation.ListChangeSets

Read ListChangeSetsResponse 
Instance details

Defined in Amazonka.CloudFormation.ListChangeSets

Read ListExports 
Instance details

Defined in Amazonka.CloudFormation.ListExports

Read ListExportsResponse 
Instance details

Defined in Amazonka.CloudFormation.ListExports

Read ListImports 
Instance details

Defined in Amazonka.CloudFormation.ListImports

Read ListImportsResponse 
Instance details

Defined in Amazonka.CloudFormation.ListImports

Read ListStackInstances 
Instance details

Defined in Amazonka.CloudFormation.ListStackInstances

Read ListStackInstancesResponse 
Instance details

Defined in Amazonka.CloudFormation.ListStackInstances

Read ListStackResources 
Instance details

Defined in Amazonka.CloudFormation.ListStackResources

Read ListStackResourcesResponse 
Instance details

Defined in Amazonka.CloudFormation.ListStackResources

Read ListStackSetOperationResults 
Instance details

Defined in Amazonka.CloudFormation.ListStackSetOperationResults

Read ListStackSetOperationResultsResponse 
Instance details

Defined in Amazonka.CloudFormation.ListStackSetOperationResults

Read ListStackSetOperations 
Instance details

Defined in Amazonka.CloudFormation.ListStackSetOperations

Read ListStackSetOperationsResponse 
Instance details

Defined in Amazonka.CloudFormation.ListStackSetOperations

Read ListStackSets 
Instance details

Defined in Amazonka.CloudFormation.ListStackSets

Read ListStackSetsResponse 
Instance details

Defined in Amazonka.CloudFormation.ListStackSets

Read ListStacks 
Instance details

Defined in Amazonka.CloudFormation.ListStacks

Read ListStacksResponse 
Instance details

Defined in Amazonka.CloudFormation.ListStacks

Read ListTypeRegistrations 
Instance details

Defined in Amazonka.CloudFormation.ListTypeRegistrations

Read ListTypeRegistrationsResponse 
Instance details

Defined in Amazonka.CloudFormation.ListTypeRegistrations

Read ListTypeVersions 
Instance details

Defined in Amazonka.CloudFormation.ListTypeVersions

Read ListTypeVersionsResponse 
Instance details

Defined in Amazonka.CloudFormation.ListTypeVersions

Read ListTypes 
Instance details

Defined in Amazonka.CloudFormation.ListTypes

Read ListTypesResponse 
Instance details

Defined in Amazonka.CloudFormation.ListTypes

Read PublishType 
Instance details

Defined in Amazonka.CloudFormation.PublishType

Read PublishTypeResponse 
Instance details

Defined in Amazonka.CloudFormation.PublishType

Read RecordHandlerProgress 
Instance details

Defined in Amazonka.CloudFormation.RecordHandlerProgress

Read RecordHandlerProgressResponse 
Instance details

Defined in Amazonka.CloudFormation.RecordHandlerProgress

Read RegisterPublisher 
Instance details

Defined in Amazonka.CloudFormation.RegisterPublisher

Read RegisterPublisherResponse 
Instance details

Defined in Amazonka.CloudFormation.RegisterPublisher

Read RegisterType 
Instance details

Defined in Amazonka.CloudFormation.RegisterType

Read RegisterTypeResponse 
Instance details

Defined in Amazonka.CloudFormation.RegisterType

Read RollbackStack 
Instance details

Defined in Amazonka.CloudFormation.RollbackStack

Read RollbackStackResponse 
Instance details

Defined in Amazonka.CloudFormation.RollbackStack

Read SetStackPolicy 
Instance details

Defined in Amazonka.CloudFormation.SetStackPolicy

Read SetStackPolicyResponse 
Instance details

Defined in Amazonka.CloudFormation.SetStackPolicy

Read SetTypeConfiguration 
Instance details

Defined in Amazonka.CloudFormation.SetTypeConfiguration

Read SetTypeConfigurationResponse 
Instance details

Defined in Amazonka.CloudFormation.SetTypeConfiguration

Read SetTypeDefaultVersion 
Instance details

Defined in Amazonka.CloudFormation.SetTypeDefaultVersion

Read SetTypeDefaultVersionResponse 
Instance details

Defined in Amazonka.CloudFormation.SetTypeDefaultVersion

Read SignalResource 
Instance details

Defined in Amazonka.CloudFormation.SignalResource

Read SignalResourceResponse 
Instance details

Defined in Amazonka.CloudFormation.SignalResource

Read StopStackSetOperation 
Instance details

Defined in Amazonka.CloudFormation.StopStackSetOperation

Read StopStackSetOperationResponse 
Instance details

Defined in Amazonka.CloudFormation.StopStackSetOperation

Read TestType 
Instance details

Defined in Amazonka.CloudFormation.TestType

Read TestTypeResponse 
Instance details

Defined in Amazonka.CloudFormation.TestType

Read AccountFilterType 
Instance details

Defined in Amazonka.CloudFormation.Types.AccountFilterType

Read AccountGateResult 
Instance details

Defined in Amazonka.CloudFormation.Types.AccountGateResult

Read AccountGateStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.AccountGateStatus

Read AccountLimit 
Instance details

Defined in Amazonka.CloudFormation.Types.AccountLimit

Read AutoDeployment 
Instance details

Defined in Amazonka.CloudFormation.Types.AutoDeployment

Read BatchDescribeTypeConfigurationsError 
Instance details

Defined in Amazonka.CloudFormation.Types.BatchDescribeTypeConfigurationsError

Read CallAs 
Instance details

Defined in Amazonka.CloudFormation.Types.CallAs

Read Capability 
Instance details

Defined in Amazonka.CloudFormation.Types.Capability

Read Category 
Instance details

Defined in Amazonka.CloudFormation.Types.Category

Read Change 
Instance details

Defined in Amazonka.CloudFormation.Types.Change

Read ChangeAction 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeAction

Read ChangeSetHook 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetHook

Read ChangeSetHookResourceTargetDetails 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetHookResourceTargetDetails

Read ChangeSetHookTargetDetails 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetHookTargetDetails

Read ChangeSetHooksStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetHooksStatus

Read ChangeSetStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetStatus

Read ChangeSetSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetSummary

Read ChangeSetType 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetType

Read ChangeSource 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSource

Read ChangeType 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeType

Read DeploymentTargets 
Instance details

Defined in Amazonka.CloudFormation.Types.DeploymentTargets

Read DeprecatedStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.DeprecatedStatus

Read DifferenceType 
Instance details

Defined in Amazonka.CloudFormation.Types.DifferenceType

Read EvaluationType 
Instance details

Defined in Amazonka.CloudFormation.Types.EvaluationType

Read ExecutionStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.ExecutionStatus

Read Export 
Instance details

Defined in Amazonka.CloudFormation.Types.Export

Read HandlerErrorCode 
Instance details

Defined in Amazonka.CloudFormation.Types.HandlerErrorCode

Read HookFailureMode 
Instance details

Defined in Amazonka.CloudFormation.Types.HookFailureMode

Read HookInvocationPoint 
Instance details

Defined in Amazonka.CloudFormation.Types.HookInvocationPoint

Read HookStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.HookStatus

Read HookTargetType 
Instance details

Defined in Amazonka.CloudFormation.Types.HookTargetType

Read IdentityProvider 
Instance details

Defined in Amazonka.CloudFormation.Types.IdentityProvider

Read LoggingConfig 
Instance details

Defined in Amazonka.CloudFormation.Types.LoggingConfig

Read ManagedExecution 
Instance details

Defined in Amazonka.CloudFormation.Types.ManagedExecution

Read ModuleInfo 
Instance details

Defined in Amazonka.CloudFormation.Types.ModuleInfo

Read OnFailure 
Instance details

Defined in Amazonka.CloudFormation.Types.OnFailure

Read OperationResultFilter 
Instance details

Defined in Amazonka.CloudFormation.Types.OperationResultFilter

Read OperationResultFilterName 
Instance details

Defined in Amazonka.CloudFormation.Types.OperationResultFilterName

Read OperationStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.OperationStatus

Read Output 
Instance details

Defined in Amazonka.CloudFormation.Types.Output

Read Parameter 
Instance details

Defined in Amazonka.CloudFormation.Types.Parameter

Read ParameterConstraints 
Instance details

Defined in Amazonka.CloudFormation.Types.ParameterConstraints

Read ParameterDeclaration 
Instance details

Defined in Amazonka.CloudFormation.Types.ParameterDeclaration

Read PermissionModels 
Instance details

Defined in Amazonka.CloudFormation.Types.PermissionModels

Read PhysicalResourceIdContextKeyValuePair 
Instance details

Defined in Amazonka.CloudFormation.Types.PhysicalResourceIdContextKeyValuePair

Read PropertyDifference 
Instance details

Defined in Amazonka.CloudFormation.Types.PropertyDifference

Read ProvisioningType 
Instance details

Defined in Amazonka.CloudFormation.Types.ProvisioningType

Read PublisherStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.PublisherStatus

Read RegionConcurrencyType 
Instance details

Defined in Amazonka.CloudFormation.Types.RegionConcurrencyType

Read RegistrationStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.RegistrationStatus

Read RegistryType 
Instance details

Defined in Amazonka.CloudFormation.Types.RegistryType

Read Replacement 
Instance details

Defined in Amazonka.CloudFormation.Types.Replacement

Read RequiredActivatedType 
Instance details

Defined in Amazonka.CloudFormation.Types.RequiredActivatedType

Read RequiresRecreation 
Instance details

Defined in Amazonka.CloudFormation.Types.RequiresRecreation

Read ResourceAttribute 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceAttribute

Read ResourceChange 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceChange

Read ResourceChangeDetail 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceChangeDetail

Read ResourceIdentifierSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceIdentifierSummary

Read ResourceSignalStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceSignalStatus

Read ResourceStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceStatus

Read ResourceTargetDefinition 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceTargetDefinition

Read ResourceToImport 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceToImport

Read RollbackConfiguration 
Instance details

Defined in Amazonka.CloudFormation.Types.RollbackConfiguration

Read RollbackTrigger 
Instance details

Defined in Amazonka.CloudFormation.Types.RollbackTrigger

Read Stack 
Instance details

Defined in Amazonka.CloudFormation.Types.Stack

Read StackDriftDetectionStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackDriftDetectionStatus

Read StackDriftInformation 
Instance details

Defined in Amazonka.CloudFormation.Types.StackDriftInformation

Read StackDriftInformationSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackDriftInformationSummary

Read StackDriftStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackDriftStatus

Read StackEvent 
Instance details

Defined in Amazonka.CloudFormation.Types.StackEvent

Read StackInstance 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstance

Read StackInstanceComprehensiveStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstanceComprehensiveStatus

Read StackInstanceDetailedStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstanceDetailedStatus

Read StackInstanceFilter 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstanceFilter

Read StackInstanceFilterName 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstanceFilterName

Read StackInstanceStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstanceStatus

Read StackInstanceSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstanceSummary

Read StackResource 
Instance details

Defined in Amazonka.CloudFormation.Types.StackResource

Read StackResourceDetail 
Instance details

Defined in Amazonka.CloudFormation.Types.StackResourceDetail

Read StackResourceDrift 
Instance details

Defined in Amazonka.CloudFormation.Types.StackResourceDrift

Read StackResourceDriftInformation 
Instance details

Defined in Amazonka.CloudFormation.Types.StackResourceDriftInformation

Read StackResourceDriftInformationSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackResourceDriftInformationSummary

Read StackResourceDriftStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackResourceDriftStatus

Read StackResourceSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackResourceSummary

Read StackSet 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSet

Read StackSetDriftDetectionDetails 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetDriftDetectionDetails

Read StackSetDriftDetectionStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetDriftDetectionStatus

Read StackSetDriftStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetDriftStatus

Read StackSetOperation 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperation

Read StackSetOperationAction 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationAction

Read StackSetOperationPreferences 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationPreferences

Read StackSetOperationResultStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationResultStatus

Read StackSetOperationResultSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationResultSummary

Read StackSetOperationStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationStatus

Read StackSetOperationStatusDetails 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationStatusDetails

Read StackSetOperationSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationSummary

Read StackSetStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetStatus

Read StackSetSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetSummary

Read StackStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackStatus

Read StackSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSummary

Read Tag 
Instance details

Defined in Amazonka.CloudFormation.Types.Tag

Read TemplateParameter 
Instance details

Defined in Amazonka.CloudFormation.Types.TemplateParameter

Read TemplateStage 
Instance details

Defined in Amazonka.CloudFormation.Types.TemplateStage

Read ThirdPartyType 
Instance details

Defined in Amazonka.CloudFormation.Types.ThirdPartyType

Read TypeConfigurationDetails 
Instance details

Defined in Amazonka.CloudFormation.Types.TypeConfigurationDetails

Read TypeConfigurationIdentifier 
Instance details

Defined in Amazonka.CloudFormation.Types.TypeConfigurationIdentifier

Read TypeFilters 
Instance details

Defined in Amazonka.CloudFormation.Types.TypeFilters

Read TypeSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.TypeSummary

Read TypeTestsStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.TypeTestsStatus

Read TypeVersionSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.TypeVersionSummary

Read VersionBump 
Instance details

Defined in Amazonka.CloudFormation.Types.VersionBump

Read Visibility 
Instance details

Defined in Amazonka.CloudFormation.Types.Visibility

Read UpdateStack 
Instance details

Defined in Amazonka.CloudFormation.UpdateStack

Read UpdateStackResponse 
Instance details

Defined in Amazonka.CloudFormation.UpdateStack

Read UpdateStackInstances 
Instance details

Defined in Amazonka.CloudFormation.UpdateStackInstances

Read UpdateStackInstancesResponse 
Instance details

Defined in Amazonka.CloudFormation.UpdateStackInstances

Read UpdateStackSet 
Instance details

Defined in Amazonka.CloudFormation.UpdateStackSet

Read UpdateStackSetResponse 
Instance details

Defined in Amazonka.CloudFormation.UpdateStackSet

Read UpdateTerminationProtection 
Instance details

Defined in Amazonka.CloudFormation.UpdateTerminationProtection

Read UpdateTerminationProtectionResponse 
Instance details

Defined in Amazonka.CloudFormation.UpdateTerminationProtection

Read ValidateTemplate 
Instance details

Defined in Amazonka.CloudFormation.ValidateTemplate

Read ValidateTemplateResponse 
Instance details

Defined in Amazonka.CloudFormation.ValidateTemplate

Read Base64 
Instance details

Defined in Amazonka.Data.Base64

Read Format 
Instance details

Defined in Amazonka.Data.Time

Read AccessKey 
Instance details

Defined in Amazonka.Types

Read Region 
Instance details

Defined in Amazonka.Types

Read Seconds 
Instance details

Defined in Amazonka.Types

Read DescribeAvailabilityZones 
Instance details

Defined in Amazonka.EC2.DescribeAvailabilityZones

Read DescribeAvailabilityZonesResponse 
Instance details

Defined in Amazonka.EC2.DescribeAvailabilityZones

Read DeleteTag 
Instance details

Defined in Amazonka.EC2.Internal

Read AcceleratorCount 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorCount

Read AcceleratorCountRequest 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorCountRequest

Read AcceleratorManufacturer 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorManufacturer

Read AcceleratorName 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorName

Read AcceleratorTotalMemoryMiB 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorTotalMemoryMiB

Read AcceleratorTotalMemoryMiBRequest 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorTotalMemoryMiBRequest

Read AcceleratorType 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorType

Read AccessScopeAnalysisFinding 
Instance details

Defined in Amazonka.EC2.Types.AccessScopeAnalysisFinding

Read AccessScopePath 
Instance details

Defined in Amazonka.EC2.Types.AccessScopePath

Read AccessScopePathRequest 
Instance details

Defined in Amazonka.EC2.Types.AccessScopePathRequest

Read AccountAttribute 
Instance details

Defined in Amazonka.EC2.Types.AccountAttribute

Read AccountAttributeName 
Instance details

Defined in Amazonka.EC2.Types.AccountAttributeName

Read AccountAttributeValue 
Instance details

Defined in Amazonka.EC2.Types.AccountAttributeValue

Read ActiveInstance 
Instance details

Defined in Amazonka.EC2.Types.ActiveInstance

Read ActivityStatus 
Instance details

Defined in Amazonka.EC2.Types.ActivityStatus

Read AddIpamOperatingRegion 
Instance details

Defined in Amazonka.EC2.Types.AddIpamOperatingRegion

Read AddPrefixListEntry 
Instance details

Defined in Amazonka.EC2.Types.AddPrefixListEntry

Read AddedPrincipal 
Instance details

Defined in Amazonka.EC2.Types.AddedPrincipal

Read AdditionalDetail 
Instance details

Defined in Amazonka.EC2.Types.AdditionalDetail

Read Address 
Instance details

Defined in Amazonka.EC2.Types.Address

Read AddressAttribute 
Instance details

Defined in Amazonka.EC2.Types.AddressAttribute

Read AddressAttributeName 
Instance details

Defined in Amazonka.EC2.Types.AddressAttributeName

Read AddressFamily 
Instance details

Defined in Amazonka.EC2.Types.AddressFamily

Read AddressStatus 
Instance details

Defined in Amazonka.EC2.Types.AddressStatus

Read AddressTransfer 
Instance details

Defined in Amazonka.EC2.Types.AddressTransfer

Read AddressTransferStatus 
Instance details

Defined in Amazonka.EC2.Types.AddressTransferStatus

Read Affinity 
Instance details

Defined in Amazonka.EC2.Types.Affinity

Read AllocationState 
Instance details

Defined in Amazonka.EC2.Types.AllocationState

Read AllocationStrategy 
Instance details

Defined in Amazonka.EC2.Types.AllocationStrategy

Read AllocationType 
Instance details

Defined in Amazonka.EC2.Types.AllocationType

Read AllowedPrincipal 
Instance details

Defined in Amazonka.EC2.Types.AllowedPrincipal

Read AllowsMultipleInstanceTypes 
Instance details

Defined in Amazonka.EC2.Types.AllowsMultipleInstanceTypes

Read AlternatePathHint 
Instance details

Defined in Amazonka.EC2.Types.AlternatePathHint

Read AnalysisAclRule 
Instance details

Defined in Amazonka.EC2.Types.AnalysisAclRule

Read AnalysisComponent 
Instance details

Defined in Amazonka.EC2.Types.AnalysisComponent

Read AnalysisLoadBalancerListener 
Instance details

Defined in Amazonka.EC2.Types.AnalysisLoadBalancerListener

Read AnalysisLoadBalancerTarget 
Instance details

Defined in Amazonka.EC2.Types.AnalysisLoadBalancerTarget

Read AnalysisPacketHeader 
Instance details

Defined in Amazonka.EC2.Types.AnalysisPacketHeader

Read AnalysisRouteTableRoute 
Instance details

Defined in Amazonka.EC2.Types.AnalysisRouteTableRoute

Read AnalysisSecurityGroupRule 
Instance details

Defined in Amazonka.EC2.Types.AnalysisSecurityGroupRule

Read AnalysisStatus 
Instance details

Defined in Amazonka.EC2.Types.AnalysisStatus

Read ApplianceModeSupportValue 
Instance details

Defined in Amazonka.EC2.Types.ApplianceModeSupportValue

Read ArchitectureType 
Instance details

Defined in Amazonka.EC2.Types.ArchitectureType

Read ArchitectureValues 
Instance details

Defined in Amazonka.EC2.Types.ArchitectureValues

Read AssignedPrivateIpAddress 
Instance details

Defined in Amazonka.EC2.Types.AssignedPrivateIpAddress

Read AssociatedNetworkType 
Instance details

Defined in Amazonka.EC2.Types.AssociatedNetworkType

Read AssociatedRole 
Instance details

Defined in Amazonka.EC2.Types.AssociatedRole

Read AssociatedTargetNetwork 
Instance details

Defined in Amazonka.EC2.Types.AssociatedTargetNetwork

Read AssociationStatus 
Instance details

Defined in Amazonka.EC2.Types.AssociationStatus

Read AssociationStatusCode 
Instance details

Defined in Amazonka.EC2.Types.AssociationStatusCode

Read AthenaIntegration 
Instance details

Defined in Amazonka.EC2.Types.AthenaIntegration

Read AttachmentEnaSrdSpecification 
Instance details

Defined in Amazonka.EC2.Types.AttachmentEnaSrdSpecification

Read AttachmentEnaSrdUdpSpecification 
Instance details

Defined in Amazonka.EC2.Types.AttachmentEnaSrdUdpSpecification

Read AttachmentStatus 
Instance details

Defined in Amazonka.EC2.Types.AttachmentStatus

Read AttributeBooleanValue 
Instance details

Defined in Amazonka.EC2.Types.AttributeBooleanValue

Read AttributeValue 
Instance details

Defined in Amazonka.EC2.Types.AttributeValue

Read AuthorizationRule 
Instance details

Defined in Amazonka.EC2.Types.AuthorizationRule

Read AutoAcceptSharedAssociationsValue 
Instance details

Defined in Amazonka.EC2.Types.AutoAcceptSharedAssociationsValue

Read AutoAcceptSharedAttachmentsValue 
Instance details

Defined in Amazonka.EC2.Types.AutoAcceptSharedAttachmentsValue

Read AutoPlacement 
Instance details

Defined in Amazonka.EC2.Types.AutoPlacement

Read AvailabilityZone 
Instance details

Defined in Amazonka.EC2.Types.AvailabilityZone

Read AvailabilityZoneMessage 
Instance details

Defined in Amazonka.EC2.Types.AvailabilityZoneMessage

Read AvailabilityZoneOptInStatus 
Instance details

Defined in Amazonka.EC2.Types.AvailabilityZoneOptInStatus

Read AvailabilityZoneState 
Instance details

Defined in Amazonka.EC2.Types.AvailabilityZoneState

Read AvailableCapacity 
Instance details

Defined in Amazonka.EC2.Types.AvailableCapacity

Read BareMetal 
Instance details

Defined in Amazonka.EC2.Types.BareMetal

Read BaselineEbsBandwidthMbps 
Instance details

Defined in Amazonka.EC2.Types.BaselineEbsBandwidthMbps

Read BaselineEbsBandwidthMbpsRequest 
Instance details

Defined in Amazonka.EC2.Types.BaselineEbsBandwidthMbpsRequest

Read BatchState 
Instance details

Defined in Amazonka.EC2.Types.BatchState

Read BgpStatus 
Instance details

Defined in Amazonka.EC2.Types.BgpStatus

Read BlobAttributeValue 
Instance details

Defined in Amazonka.EC2.Types.BlobAttributeValue

Read BlockDeviceMapping 
Instance details

Defined in Amazonka.EC2.Types.BlockDeviceMapping

Read BootModeType 
Instance details

Defined in Amazonka.EC2.Types.BootModeType

Read BootModeValues 
Instance details

Defined in Amazonka.EC2.Types.BootModeValues

Read BundleTask 
Instance details

Defined in Amazonka.EC2.Types.BundleTask

Read BundleTaskError 
Instance details

Defined in Amazonka.EC2.Types.BundleTaskError

Read BundleTaskState 
Instance details

Defined in Amazonka.EC2.Types.BundleTaskState

Read BurstablePerformance 
Instance details

Defined in Amazonka.EC2.Types.BurstablePerformance

Read ByoipCidr 
Instance details

Defined in Amazonka.EC2.Types.ByoipCidr

Read ByoipCidrState 
Instance details

Defined in Amazonka.EC2.Types.ByoipCidrState

Read CancelBatchErrorCode 
Instance details

Defined in Amazonka.EC2.Types.CancelBatchErrorCode

Read CancelCapacityReservationFleetError 
Instance details

Defined in Amazonka.EC2.Types.CancelCapacityReservationFleetError

Read CancelSpotFleetRequestsError 
Instance details

Defined in Amazonka.EC2.Types.CancelSpotFleetRequestsError

Read CancelSpotFleetRequestsErrorItem 
Instance details

Defined in Amazonka.EC2.Types.CancelSpotFleetRequestsErrorItem

Read CancelSpotFleetRequestsSuccessItem 
Instance details

Defined in Amazonka.EC2.Types.CancelSpotFleetRequestsSuccessItem

Read CancelSpotInstanceRequestState 
Instance details

Defined in Amazonka.EC2.Types.CancelSpotInstanceRequestState

Read CancelledSpotInstanceRequest 
Instance details

Defined in Amazonka.EC2.Types.CancelledSpotInstanceRequest

Read CapacityAllocation 
Instance details

Defined in Amazonka.EC2.Types.CapacityAllocation

Read CapacityReservation 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservation

Read CapacityReservationFleet 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationFleet

Read CapacityReservationFleetCancellationState 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationFleetCancellationState

Read CapacityReservationFleetState 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationFleetState

Read CapacityReservationGroup 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationGroup

Read CapacityReservationInstancePlatform 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationInstancePlatform

Read CapacityReservationOptions 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationOptions

Read CapacityReservationOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationOptionsRequest

Read CapacityReservationPreference 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationPreference

Read CapacityReservationSpecification 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationSpecification

Read CapacityReservationSpecificationResponse 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationSpecificationResponse

Read CapacityReservationState 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationState

Read CapacityReservationTarget 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationTarget

Read CapacityReservationTargetResponse 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationTargetResponse

Read CapacityReservationTenancy 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationTenancy

Read CarrierGateway 
Instance details

Defined in Amazonka.EC2.Types.CarrierGateway

Read CarrierGatewayState 
Instance details

Defined in Amazonka.EC2.Types.CarrierGatewayState

Read CertificateAuthentication 
Instance details

Defined in Amazonka.EC2.Types.CertificateAuthentication

Read CertificateAuthenticationRequest 
Instance details

Defined in Amazonka.EC2.Types.CertificateAuthenticationRequest

Read CidrAuthorizationContext 
Instance details

Defined in Amazonka.EC2.Types.CidrAuthorizationContext

Read CidrBlock 
Instance details

Defined in Amazonka.EC2.Types.CidrBlock

Read ClassicLinkDnsSupport 
Instance details

Defined in Amazonka.EC2.Types.ClassicLinkDnsSupport

Read ClassicLinkInstance 
Instance details

Defined in Amazonka.EC2.Types.ClassicLinkInstance

Read ClassicLoadBalancer 
Instance details

Defined in Amazonka.EC2.Types.ClassicLoadBalancer

Read ClassicLoadBalancersConfig 
Instance details

Defined in Amazonka.EC2.Types.ClassicLoadBalancersConfig

Read ClientCertificateRevocationListStatus 
Instance details

Defined in Amazonka.EC2.Types.ClientCertificateRevocationListStatus

Read ClientCertificateRevocationListStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientCertificateRevocationListStatusCode

Read ClientConnectOptions 
Instance details

Defined in Amazonka.EC2.Types.ClientConnectOptions

Read ClientConnectResponseOptions 
Instance details

Defined in Amazonka.EC2.Types.ClientConnectResponseOptions

Read ClientData 
Instance details

Defined in Amazonka.EC2.Types.ClientData

Read ClientLoginBannerOptions 
Instance details

Defined in Amazonka.EC2.Types.ClientLoginBannerOptions

Read ClientLoginBannerResponseOptions 
Instance details

Defined in Amazonka.EC2.Types.ClientLoginBannerResponseOptions

Read ClientVpnAuthentication 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnAuthentication

Read ClientVpnAuthenticationRequest 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnAuthenticationRequest

Read ClientVpnAuthenticationType 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnAuthenticationType

Read ClientVpnAuthorizationRuleStatus 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnAuthorizationRuleStatus

Read ClientVpnAuthorizationRuleStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnAuthorizationRuleStatusCode

Read ClientVpnConnection 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnConnection

Read ClientVpnConnectionStatus 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnConnectionStatus

Read ClientVpnConnectionStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnConnectionStatusCode

Read ClientVpnEndpoint 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnEndpoint

Read ClientVpnEndpointAttributeStatus 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnEndpointAttributeStatus

Read ClientVpnEndpointAttributeStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnEndpointAttributeStatusCode

Read ClientVpnEndpointStatus 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnEndpointStatus

Read ClientVpnEndpointStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnEndpointStatusCode

Read ClientVpnRoute 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnRoute

Read ClientVpnRouteStatus 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnRouteStatus

Read ClientVpnRouteStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnRouteStatusCode

Read CloudWatchLogOptions 
Instance details

Defined in Amazonka.EC2.Types.CloudWatchLogOptions

Read CloudWatchLogOptionsSpecification 
Instance details

Defined in Amazonka.EC2.Types.CloudWatchLogOptionsSpecification

Read CoipAddressUsage 
Instance details

Defined in Amazonka.EC2.Types.CoipAddressUsage

Read CoipCidr 
Instance details

Defined in Amazonka.EC2.Types.CoipCidr

Read CoipPool 
Instance details

Defined in Amazonka.EC2.Types.CoipPool

Read ConnectionLogOptions 
Instance details

Defined in Amazonka.EC2.Types.ConnectionLogOptions

Read ConnectionLogResponseOptions 
Instance details

Defined in Amazonka.EC2.Types.ConnectionLogResponseOptions

Read ConnectionNotification 
Instance details

Defined in Amazonka.EC2.Types.ConnectionNotification

Read ConnectionNotificationState 
Instance details

Defined in Amazonka.EC2.Types.ConnectionNotificationState

Read ConnectionNotificationType 
Instance details

Defined in Amazonka.EC2.Types.ConnectionNotificationType

Read ConnectivityType 
Instance details

Defined in Amazonka.EC2.Types.ConnectivityType

Read ContainerFormat 
Instance details

Defined in Amazonka.EC2.Types.ContainerFormat

Read ConversionTask 
Instance details

Defined in Amazonka.EC2.Types.ConversionTask

Read ConversionTaskState 
Instance details

Defined in Amazonka.EC2.Types.ConversionTaskState

Read CopyTagsFromSource 
Instance details

Defined in Amazonka.EC2.Types.CopyTagsFromSource

Read CpuManufacturer 
Instance details

Defined in Amazonka.EC2.Types.CpuManufacturer

Read CpuOptions 
Instance details

Defined in Amazonka.EC2.Types.CpuOptions

Read CpuOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.CpuOptionsRequest

Read CreateFleetError 
Instance details

Defined in Amazonka.EC2.Types.CreateFleetError

Read CreateFleetInstance 
Instance details

Defined in Amazonka.EC2.Types.CreateFleetInstance

Read CreateTransitGatewayConnectRequestOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateTransitGatewayConnectRequestOptions

Read CreateTransitGatewayMulticastDomainRequestOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateTransitGatewayMulticastDomainRequestOptions

Read CreateTransitGatewayPeeringAttachmentRequestOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateTransitGatewayPeeringAttachmentRequestOptions

Read CreateTransitGatewayVpcAttachmentRequestOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateTransitGatewayVpcAttachmentRequestOptions

Read CreateVerifiedAccessEndpointEniOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateVerifiedAccessEndpointEniOptions

Read CreateVerifiedAccessEndpointLoadBalancerOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateVerifiedAccessEndpointLoadBalancerOptions

Read CreateVerifiedAccessTrustProviderDeviceOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateVerifiedAccessTrustProviderDeviceOptions

Read CreateVerifiedAccessTrustProviderOidcOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateVerifiedAccessTrustProviderOidcOptions

Read CreateVolumePermission 
Instance details

Defined in Amazonka.EC2.Types.CreateVolumePermission

Read CreateVolumePermissionModifications 
Instance details

Defined in Amazonka.EC2.Types.CreateVolumePermissionModifications

Read CreditSpecification 
Instance details

Defined in Amazonka.EC2.Types.CreditSpecification

Read CreditSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.CreditSpecificationRequest

Read CurrencyCodeValues 
Instance details

Defined in Amazonka.EC2.Types.CurrencyCodeValues

Read CustomerGateway 
Instance details

Defined in Amazonka.EC2.Types.CustomerGateway

Read DataQuery 
Instance details

Defined in Amazonka.EC2.Types.DataQuery

Read DataResponse 
Instance details

Defined in Amazonka.EC2.Types.DataResponse

Read DatafeedSubscriptionState 
Instance details

Defined in Amazonka.EC2.Types.DatafeedSubscriptionState

Read DefaultRouteTableAssociationValue 
Instance details

Defined in Amazonka.EC2.Types.DefaultRouteTableAssociationValue

Read DefaultRouteTablePropagationValue 
Instance details

Defined in Amazonka.EC2.Types.DefaultRouteTablePropagationValue

Read DefaultTargetCapacityType 
Instance details

Defined in Amazonka.EC2.Types.DefaultTargetCapacityType

Read DeleteFleetError 
Instance details

Defined in Amazonka.EC2.Types.DeleteFleetError

Read DeleteFleetErrorCode 
Instance details

Defined in Amazonka.EC2.Types.DeleteFleetErrorCode

Read DeleteFleetErrorItem 
Instance details

Defined in Amazonka.EC2.Types.DeleteFleetErrorItem

Read DeleteFleetSuccessItem 
Instance details

Defined in Amazonka.EC2.Types.DeleteFleetSuccessItem

Read DeleteLaunchTemplateVersionsResponseErrorItem 
Instance details

Defined in Amazonka.EC2.Types.DeleteLaunchTemplateVersionsResponseErrorItem

Read DeleteLaunchTemplateVersionsResponseSuccessItem 
Instance details

Defined in Amazonka.EC2.Types.DeleteLaunchTemplateVersionsResponseSuccessItem

Read DeleteQueuedReservedInstancesError 
Instance details

Defined in Amazonka.EC2.Types.DeleteQueuedReservedInstancesError

Read DeleteQueuedReservedInstancesErrorCode 
Instance details

Defined in Amazonka.EC2.Types.DeleteQueuedReservedInstancesErrorCode

Read DeregisterInstanceTagAttributeRequest 
Instance details

Defined in Amazonka.EC2.Types.DeregisterInstanceTagAttributeRequest

Read DescribeFastLaunchImagesSuccessItem 
Instance details

Defined in Amazonka.EC2.Types.DescribeFastLaunchImagesSuccessItem

Read DescribeFastSnapshotRestoreSuccessItem 
Instance details

Defined in Amazonka.EC2.Types.DescribeFastSnapshotRestoreSuccessItem

Read DescribeFleetError 
Instance details

Defined in Amazonka.EC2.Types.DescribeFleetError

Read DescribeFleetsInstances 
Instance details

Defined in Amazonka.EC2.Types.DescribeFleetsInstances

Read DestinationFileFormat 
Instance details

Defined in Amazonka.EC2.Types.DestinationFileFormat

Read DestinationOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.DestinationOptionsRequest

Read DestinationOptionsResponse 
Instance details

Defined in Amazonka.EC2.Types.DestinationOptionsResponse

Read DeviceOptions 
Instance details

Defined in Amazonka.EC2.Types.DeviceOptions

Read DeviceTrustProviderType 
Instance details

Defined in Amazonka.EC2.Types.DeviceTrustProviderType

Read DeviceType 
Instance details

Defined in Amazonka.EC2.Types.DeviceType

Read DhcpConfiguration 
Instance details

Defined in Amazonka.EC2.Types.DhcpConfiguration

Read DhcpOptions 
Instance details

Defined in Amazonka.EC2.Types.DhcpOptions

Read DirectoryServiceAuthentication 
Instance details

Defined in Amazonka.EC2.Types.DirectoryServiceAuthentication

Read DirectoryServiceAuthenticationRequest 
Instance details

Defined in Amazonka.EC2.Types.DirectoryServiceAuthenticationRequest

Read DisableFastSnapshotRestoreErrorItem 
Instance details

Defined in Amazonka.EC2.Types.DisableFastSnapshotRestoreErrorItem

Read DisableFastSnapshotRestoreStateError 
Instance details

Defined in Amazonka.EC2.Types.DisableFastSnapshotRestoreStateError

Read DisableFastSnapshotRestoreStateErrorItem 
Instance details

Defined in Amazonka.EC2.Types.DisableFastSnapshotRestoreStateErrorItem

Read DisableFastSnapshotRestoreSuccessItem 
Instance details

Defined in Amazonka.EC2.Types.DisableFastSnapshotRestoreSuccessItem

Read DiskImage 
Instance details

Defined in Amazonka.EC2.Types.DiskImage

Read DiskImageDescription 
Instance details

Defined in Amazonka.EC2.Types.DiskImageDescription

Read DiskImageDetail 
Instance details

Defined in Amazonka.EC2.Types.DiskImageDetail

Read DiskImageFormat 
Instance details

Defined in Amazonka.EC2.Types.DiskImageFormat

Read DiskImageVolumeDescription 
Instance details

Defined in Amazonka.EC2.Types.DiskImageVolumeDescription

Read DiskInfo 
Instance details

Defined in Amazonka.EC2.Types.DiskInfo

Read DiskType 
Instance details

Defined in Amazonka.EC2.Types.DiskType

Read DnsEntry 
Instance details

Defined in Amazonka.EC2.Types.DnsEntry

Read DnsNameState 
Instance details

Defined in Amazonka.EC2.Types.DnsNameState

Read DnsOptions 
Instance details

Defined in Amazonka.EC2.Types.DnsOptions

Read DnsOptionsSpecification 
Instance details

Defined in Amazonka.EC2.Types.DnsOptionsSpecification

Read DnsRecordIpType 
Instance details

Defined in Amazonka.EC2.Types.DnsRecordIpType

Read DnsServersOptionsModifyStructure 
Instance details

Defined in Amazonka.EC2.Types.DnsServersOptionsModifyStructure

Read DnsSupportValue 
Instance details

Defined in Amazonka.EC2.Types.DnsSupportValue

Read DomainType 
Instance details

Defined in Amazonka.EC2.Types.DomainType

Read DynamicRoutingValue 
Instance details

Defined in Amazonka.EC2.Types.DynamicRoutingValue

Read EbsBlockDevice 
Instance details

Defined in Amazonka.EC2.Types.EbsBlockDevice

Read EbsEncryptionSupport 
Instance details

Defined in Amazonka.EC2.Types.EbsEncryptionSupport

Read EbsInfo 
Instance details

Defined in Amazonka.EC2.Types.EbsInfo

Read EbsInstanceBlockDevice 
Instance details

Defined in Amazonka.EC2.Types.EbsInstanceBlockDevice

Read EbsInstanceBlockDeviceSpecification 
Instance details

Defined in Amazonka.EC2.Types.EbsInstanceBlockDeviceSpecification

Read EbsNvmeSupport 
Instance details

Defined in Amazonka.EC2.Types.EbsNvmeSupport

Read EbsOptimizedInfo 
Instance details

Defined in Amazonka.EC2.Types.EbsOptimizedInfo

Read EbsOptimizedSupport 
Instance details

Defined in Amazonka.EC2.Types.EbsOptimizedSupport

Read EfaInfo 
Instance details

Defined in Amazonka.EC2.Types.EfaInfo

Read EgressOnlyInternetGateway 
Instance details

Defined in Amazonka.EC2.Types.EgressOnlyInternetGateway

Read ElasticGpuAssociation 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpuAssociation

Read ElasticGpuHealth 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpuHealth

Read ElasticGpuSpecification 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpuSpecification

Read ElasticGpuSpecificationResponse 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpuSpecificationResponse

Read ElasticGpuState 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpuState

Read ElasticGpuStatus 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpuStatus

Read ElasticGpus 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpus

Read ElasticInferenceAccelerator 
Instance details

Defined in Amazonka.EC2.Types.ElasticInferenceAccelerator

Read ElasticInferenceAcceleratorAssociation 
Instance details

Defined in Amazonka.EC2.Types.ElasticInferenceAcceleratorAssociation

Read EnaSrdSpecification 
Instance details

Defined in Amazonka.EC2.Types.EnaSrdSpecification

Read EnaSrdUdpSpecification 
Instance details

Defined in Amazonka.EC2.Types.EnaSrdUdpSpecification

Read EnaSupport 
Instance details

Defined in Amazonka.EC2.Types.EnaSupport

Read EnableFastSnapshotRestoreErrorItem 
Instance details

Defined in Amazonka.EC2.Types.EnableFastSnapshotRestoreErrorItem

Read EnableFastSnapshotRestoreStateError 
Instance details

Defined in Amazonka.EC2.Types.EnableFastSnapshotRestoreStateError

Read EnableFastSnapshotRestoreStateErrorItem 
Instance details

Defined in Amazonka.EC2.Types.EnableFastSnapshotRestoreStateErrorItem

Read EnableFastSnapshotRestoreSuccessItem 
Instance details

Defined in Amazonka.EC2.Types.EnableFastSnapshotRestoreSuccessItem

Read EnclaveOptions 
Instance details

Defined in Amazonka.EC2.Types.EnclaveOptions

Read EnclaveOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.EnclaveOptionsRequest

Read EndDateType 
Instance details

Defined in Amazonka.EC2.Types.EndDateType

Read EphemeralNvmeSupport 
Instance details

Defined in Amazonka.EC2.Types.EphemeralNvmeSupport

Read EventCode 
Instance details

Defined in Amazonka.EC2.Types.EventCode

Read EventInformation 
Instance details

Defined in Amazonka.EC2.Types.EventInformation

Read EventType 
Instance details

Defined in Amazonka.EC2.Types.EventType

Read ExcessCapacityTerminationPolicy 
Instance details

Defined in Amazonka.EC2.Types.ExcessCapacityTerminationPolicy

Read Explanation 
Instance details

Defined in Amazonka.EC2.Types.Explanation

Read ExportEnvironment 
Instance details

Defined in Amazonka.EC2.Types.ExportEnvironment

Read ExportImageTask 
Instance details

Defined in Amazonka.EC2.Types.ExportImageTask

Read ExportTask 
Instance details

Defined in Amazonka.EC2.Types.ExportTask

Read ExportTaskS3Location 
Instance details

Defined in Amazonka.EC2.Types.ExportTaskS3Location

Read ExportTaskS3LocationRequest 
Instance details

Defined in Amazonka.EC2.Types.ExportTaskS3LocationRequest

Read ExportTaskState 
Instance details

Defined in Amazonka.EC2.Types.ExportTaskState

Read ExportToS3Task 
Instance details

Defined in Amazonka.EC2.Types.ExportToS3Task

Read ExportToS3TaskSpecification 
Instance details

Defined in Amazonka.EC2.Types.ExportToS3TaskSpecification

Read FailedCapacityReservationFleetCancellationResult 
Instance details

Defined in Amazonka.EC2.Types.FailedCapacityReservationFleetCancellationResult

Read FailedQueuedPurchaseDeletion 
Instance details

Defined in Amazonka.EC2.Types.FailedQueuedPurchaseDeletion

Read FastLaunchLaunchTemplateSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.FastLaunchLaunchTemplateSpecificationRequest

Read FastLaunchLaunchTemplateSpecificationResponse 
Instance details

Defined in Amazonka.EC2.Types.FastLaunchLaunchTemplateSpecificationResponse

Read FastLaunchResourceType 
Instance details

Defined in Amazonka.EC2.Types.FastLaunchResourceType

Read FastLaunchSnapshotConfigurationRequest 
Instance details

Defined in Amazonka.EC2.Types.FastLaunchSnapshotConfigurationRequest

Read FastLaunchSnapshotConfigurationResponse 
Instance details

Defined in Amazonka.EC2.Types.FastLaunchSnapshotConfigurationResponse

Read FastLaunchStateCode 
Instance details

Defined in Amazonka.EC2.Types.FastLaunchStateCode

Read FastSnapshotRestoreStateCode 
Instance details

Defined in Amazonka.EC2.Types.FastSnapshotRestoreStateCode

Read FederatedAuthentication 
Instance details

Defined in Amazonka.EC2.Types.FederatedAuthentication

Read FederatedAuthenticationRequest 
Instance details

Defined in Amazonka.EC2.Types.FederatedAuthenticationRequest

Read Filter 
Instance details

Defined in Amazonka.EC2.Types.Filter

Read FindingsFound 
Instance details

Defined in Amazonka.EC2.Types.FindingsFound

Read FleetActivityStatus 
Instance details

Defined in Amazonka.EC2.Types.FleetActivityStatus

Read FleetCapacityReservation 
Instance details

Defined in Amazonka.EC2.Types.FleetCapacityReservation

Read FleetCapacityReservationTenancy 
Instance details

Defined in Amazonka.EC2.Types.FleetCapacityReservationTenancy

Read FleetCapacityReservationUsageStrategy 
Instance details

Defined in Amazonka.EC2.Types.FleetCapacityReservationUsageStrategy

Read FleetData 
Instance details

Defined in Amazonka.EC2.Types.FleetData

Read FleetEventType 
Instance details

Defined in Amazonka.EC2.Types.FleetEventType

Read FleetExcessCapacityTerminationPolicy 
Instance details

Defined in Amazonka.EC2.Types.FleetExcessCapacityTerminationPolicy

Read FleetInstanceMatchCriteria 
Instance details

Defined in Amazonka.EC2.Types.FleetInstanceMatchCriteria

Read FleetLaunchTemplateConfig 
Instance details

Defined in Amazonka.EC2.Types.FleetLaunchTemplateConfig

Read FleetLaunchTemplateConfigRequest 
Instance details

Defined in Amazonka.EC2.Types.FleetLaunchTemplateConfigRequest

Read FleetLaunchTemplateOverrides 
Instance details

Defined in Amazonka.EC2.Types.FleetLaunchTemplateOverrides

Read FleetLaunchTemplateOverridesRequest 
Instance details

Defined in Amazonka.EC2.Types.FleetLaunchTemplateOverridesRequest

Read FleetLaunchTemplateSpecification 
Instance details

Defined in Amazonka.EC2.Types.FleetLaunchTemplateSpecification

Read FleetLaunchTemplateSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.FleetLaunchTemplateSpecificationRequest

Read FleetOnDemandAllocationStrategy 
Instance details

Defined in Amazonka.EC2.Types.FleetOnDemandAllocationStrategy

Read FleetReplacementStrategy 
Instance details

Defined in Amazonka.EC2.Types.FleetReplacementStrategy

Read FleetSpotCapacityRebalance 
Instance details

Defined in Amazonka.EC2.Types.FleetSpotCapacityRebalance

Read FleetSpotCapacityRebalanceRequest 
Instance details

Defined in Amazonka.EC2.Types.FleetSpotCapacityRebalanceRequest

Read FleetSpotMaintenanceStrategies 
Instance details

Defined in Amazonka.EC2.Types.FleetSpotMaintenanceStrategies

Read FleetSpotMaintenanceStrategiesRequest 
Instance details

Defined in Amazonka.EC2.Types.FleetSpotMaintenanceStrategiesRequest

Read FleetStateCode 
Instance details

Defined in Amazonka.EC2.Types.FleetStateCode

Read FleetType 
Instance details

Defined in Amazonka.EC2.Types.FleetType

Read FlowLog 
Instance details

Defined in Amazonka.EC2.Types.FlowLog

Read FlowLogsResourceType 
Instance details

Defined in Amazonka.EC2.Types.FlowLogsResourceType

Read FpgaDeviceInfo 
Instance details

Defined in Amazonka.EC2.Types.FpgaDeviceInfo

Read FpgaDeviceMemoryInfo 
Instance details

Defined in Amazonka.EC2.Types.FpgaDeviceMemoryInfo

Read FpgaImage 
Instance details

Defined in Amazonka.EC2.Types.FpgaImage

Read FpgaImageAttribute 
Instance details

Defined in Amazonka.EC2.Types.FpgaImageAttribute

Read FpgaImageAttributeName 
Instance details

Defined in Amazonka.EC2.Types.FpgaImageAttributeName

Read FpgaImageState 
Instance details

Defined in Amazonka.EC2.Types.FpgaImageState

Read FpgaImageStateCode 
Instance details

Defined in Amazonka.EC2.Types.FpgaImageStateCode

Read FpgaInfo 
Instance details

Defined in Amazonka.EC2.Types.FpgaInfo

Read GatewayAssociationState 
Instance details

Defined in Amazonka.EC2.Types.GatewayAssociationState

Read GatewayType 
Instance details

Defined in Amazonka.EC2.Types.GatewayType

Read GpuDeviceInfo 
Instance details

Defined in Amazonka.EC2.Types.GpuDeviceInfo

Read GpuDeviceMemoryInfo 
Instance details

Defined in Amazonka.EC2.Types.GpuDeviceMemoryInfo

Read GpuInfo 
Instance details

Defined in Amazonka.EC2.Types.GpuInfo

Read GroupIdentifier 
Instance details

Defined in Amazonka.EC2.Types.GroupIdentifier

Read HibernationOptions 
Instance details

Defined in Amazonka.EC2.Types.HibernationOptions

Read HibernationOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.HibernationOptionsRequest

Read HistoryRecord 
Instance details

Defined in Amazonka.EC2.Types.HistoryRecord

Read HistoryRecordEntry 
Instance details

Defined in Amazonka.EC2.Types.HistoryRecordEntry

Read Host 
Instance details

Defined in Amazonka.EC2.Types.Host

Read HostInstance 
Instance details

Defined in Amazonka.EC2.Types.HostInstance

Read HostOffering 
Instance details

Defined in Amazonka.EC2.Types.HostOffering

Read HostProperties 
Instance details

Defined in Amazonka.EC2.Types.HostProperties

Read HostRecovery 
Instance details

Defined in Amazonka.EC2.Types.HostRecovery

Read HostReservation 
Instance details

Defined in Amazonka.EC2.Types.HostReservation

Read HostTenancy 
Instance details

Defined in Amazonka.EC2.Types.HostTenancy

Read HostnameType 
Instance details

Defined in Amazonka.EC2.Types.HostnameType

Read HttpTokensState 
Instance details

Defined in Amazonka.EC2.Types.HttpTokensState

Read HypervisorType 
Instance details

Defined in Amazonka.EC2.Types.HypervisorType

Read IKEVersionsListValue 
Instance details

Defined in Amazonka.EC2.Types.IKEVersionsListValue

Read IKEVersionsRequestListValue 
Instance details

Defined in Amazonka.EC2.Types.IKEVersionsRequestListValue

Read IamInstanceProfile 
Instance details

Defined in Amazonka.EC2.Types.IamInstanceProfile

Read IamInstanceProfileAssociation 
Instance details

Defined in Amazonka.EC2.Types.IamInstanceProfileAssociation

Read IamInstanceProfileAssociationState 
Instance details

Defined in Amazonka.EC2.Types.IamInstanceProfileAssociationState

Read IamInstanceProfileSpecification 
Instance details

Defined in Amazonka.EC2.Types.IamInstanceProfileSpecification

Read IcmpTypeCode 
Instance details

Defined in Amazonka.EC2.Types.IcmpTypeCode

Read IdFormat 
Instance details

Defined in Amazonka.EC2.Types.IdFormat

Read Igmpv2SupportValue 
Instance details

Defined in Amazonka.EC2.Types.Igmpv2SupportValue

Read Image 
Instance details

Defined in Amazonka.EC2.Types.Image

Read ImageAttributeName 
Instance details

Defined in Amazonka.EC2.Types.ImageAttributeName

Read ImageDiskContainer 
Instance details

Defined in Amazonka.EC2.Types.ImageDiskContainer

Read ImageRecycleBinInfo 
Instance details

Defined in Amazonka.EC2.Types.ImageRecycleBinInfo

Read ImageState 
Instance details

Defined in Amazonka.EC2.Types.ImageState

Read ImageTypeValues 
Instance details

Defined in Amazonka.EC2.Types.ImageTypeValues

Read ImdsSupportValues 
Instance details

Defined in Amazonka.EC2.Types.ImdsSupportValues

Read ImportImageLicenseConfigurationRequest 
Instance details

Defined in Amazonka.EC2.Types.ImportImageLicenseConfigurationRequest

Read ImportImageLicenseConfigurationResponse 
Instance details

Defined in Amazonka.EC2.Types.ImportImageLicenseConfigurationResponse

Read ImportImageTask 
Instance details

Defined in Amazonka.EC2.Types.ImportImageTask

Read ImportInstanceTaskDetails 
Instance details

Defined in Amazonka.EC2.Types.ImportInstanceTaskDetails

Read ImportInstanceVolumeDetailItem 
Instance details

Defined in Amazonka.EC2.Types.ImportInstanceVolumeDetailItem

Read ImportSnapshotTask 
Instance details

Defined in Amazonka.EC2.Types.ImportSnapshotTask

Read ImportVolumeTaskDetails 
Instance details

Defined in Amazonka.EC2.Types.ImportVolumeTaskDetails

Read InferenceAcceleratorInfo 
Instance details

Defined in Amazonka.EC2.Types.InferenceAcceleratorInfo

Read InferenceDeviceInfo 
Instance details

Defined in Amazonka.EC2.Types.InferenceDeviceInfo

Read Instance 
Instance details

Defined in Amazonka.EC2.Types.Instance

Read InstanceAttributeName 
Instance details

Defined in Amazonka.EC2.Types.InstanceAttributeName

Read InstanceAutoRecoveryState 
Instance details

Defined in Amazonka.EC2.Types.InstanceAutoRecoveryState

Read InstanceBlockDeviceMapping 
Instance details

Defined in Amazonka.EC2.Types.InstanceBlockDeviceMapping

Read InstanceBlockDeviceMappingSpecification 
Instance details

Defined in Amazonka.EC2.Types.InstanceBlockDeviceMappingSpecification

Read InstanceCapacity 
Instance details

Defined in Amazonka.EC2.Types.InstanceCapacity

Read InstanceCount 
Instance details

Defined in Amazonka.EC2.Types.InstanceCount

Read InstanceCreditSpecification 
Instance details

Defined in Amazonka.EC2.Types.InstanceCreditSpecification

Read InstanceCreditSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceCreditSpecificationRequest

Read InstanceEventWindow 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindow

Read InstanceEventWindowAssociationRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindowAssociationRequest

Read InstanceEventWindowAssociationTarget 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindowAssociationTarget

Read InstanceEventWindowDisassociationRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindowDisassociationRequest

Read InstanceEventWindowState 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindowState

Read InstanceEventWindowStateChange 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindowStateChange

Read InstanceEventWindowTimeRange 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindowTimeRange

Read InstanceEventWindowTimeRangeRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindowTimeRangeRequest

Read InstanceExportDetails 
Instance details

Defined in Amazonka.EC2.Types.InstanceExportDetails

Read InstanceFamilyCreditSpecification 
Instance details

Defined in Amazonka.EC2.Types.InstanceFamilyCreditSpecification

Read InstanceGeneration 
Instance details

Defined in Amazonka.EC2.Types.InstanceGeneration

Read InstanceHealthStatus 
Instance details

Defined in Amazonka.EC2.Types.InstanceHealthStatus

Read InstanceInterruptionBehavior 
Instance details

Defined in Amazonka.EC2.Types.InstanceInterruptionBehavior

Read InstanceIpv4Prefix 
Instance details

Defined in Amazonka.EC2.Types.InstanceIpv4Prefix

Read InstanceIpv6Address 
Instance details

Defined in Amazonka.EC2.Types.InstanceIpv6Address

Read InstanceIpv6AddressRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceIpv6AddressRequest

Read InstanceIpv6Prefix 
Instance details

Defined in Amazonka.EC2.Types.InstanceIpv6Prefix

Read InstanceLifecycle 
Instance details

Defined in Amazonka.EC2.Types.InstanceLifecycle

Read InstanceLifecycleType 
Instance details

Defined in Amazonka.EC2.Types.InstanceLifecycleType

Read InstanceMaintenanceOptions 
Instance details

Defined in Amazonka.EC2.Types.InstanceMaintenanceOptions

Read InstanceMaintenanceOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceMaintenanceOptionsRequest

Read InstanceMarketOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceMarketOptionsRequest

Read InstanceMatchCriteria 
Instance details

Defined in Amazonka.EC2.Types.InstanceMatchCriteria

Read InstanceMetadataEndpointState 
Instance details

Defined in Amazonka.EC2.Types.InstanceMetadataEndpointState

Read InstanceMetadataOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceMetadataOptionsRequest

Read InstanceMetadataOptionsResponse 
Instance details

Defined in Amazonka.EC2.Types.InstanceMetadataOptionsResponse

Read InstanceMetadataOptionsState 
Instance details

Defined in Amazonka.EC2.Types.InstanceMetadataOptionsState

Read InstanceMetadataProtocolState 
Instance details

Defined in Amazonka.EC2.Types.InstanceMetadataProtocolState

Read InstanceMetadataTagsState 
Instance details

Defined in Amazonka.EC2.Types.InstanceMetadataTagsState

Read InstanceMonitoring 
Instance details

Defined in Amazonka.EC2.Types.InstanceMonitoring

Read InstanceNetworkInterface 
Instance details

Defined in Amazonka.EC2.Types.InstanceNetworkInterface

Read InstanceNetworkInterfaceAssociation 
Instance details

Defined in Amazonka.EC2.Types.InstanceNetworkInterfaceAssociation

Read InstanceNetworkInterfaceAttachment 
Instance details

Defined in Amazonka.EC2.Types.InstanceNetworkInterfaceAttachment

Read InstanceNetworkInterfaceSpecification 
Instance details

Defined in Amazonka.EC2.Types.InstanceNetworkInterfaceSpecification

Read InstancePrivateIpAddress 
Instance details

Defined in Amazonka.EC2.Types.InstancePrivateIpAddress

Read InstanceRequirements 
Instance details

Defined in Amazonka.EC2.Types.InstanceRequirements

Read InstanceRequirementsRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceRequirementsRequest

Read InstanceRequirementsWithMetadataRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceRequirementsWithMetadataRequest

Read InstanceSpecification 
Instance details

Defined in Amazonka.EC2.Types.InstanceSpecification

Read InstanceState 
Instance details

Defined in Amazonka.EC2.Types.InstanceState

Read InstanceStateChange 
Instance details

Defined in Amazonka.EC2.Types.InstanceStateChange

Read InstanceStateName 
Instance details

Defined in Amazonka.EC2.Types.InstanceStateName

Read InstanceStatus 
Instance details

Defined in Amazonka.EC2.Types.InstanceStatus

Read InstanceStatusDetails 
Instance details

Defined in Amazonka.EC2.Types.InstanceStatusDetails

Read InstanceStatusEvent 
Instance details

Defined in Amazonka.EC2.Types.InstanceStatusEvent

Read InstanceStatusSummary 
Instance details

Defined in Amazonka.EC2.Types.InstanceStatusSummary

Read InstanceStorageEncryptionSupport 
Instance details

Defined in Amazonka.EC2.Types.InstanceStorageEncryptionSupport

Read InstanceStorageInfo 
Instance details

Defined in Amazonka.EC2.Types.InstanceStorageInfo

Read InstanceTagNotificationAttribute 
Instance details

Defined in Amazonka.EC2.Types.InstanceTagNotificationAttribute

Read InstanceType 
Instance details

Defined in Amazonka.EC2.Types.InstanceType

Read InstanceTypeHypervisor 
Instance details

Defined in Amazonka.EC2.Types.InstanceTypeHypervisor

Read InstanceTypeInfo 
Instance details

Defined in Amazonka.EC2.Types.InstanceTypeInfo

Read InstanceTypeInfoFromInstanceRequirements 
Instance details

Defined in Amazonka.EC2.Types.InstanceTypeInfoFromInstanceRequirements

Read InstanceTypeOffering 
Instance details

Defined in Amazonka.EC2.Types.InstanceTypeOffering

Read InstanceUsage 
Instance details

Defined in Amazonka.EC2.Types.InstanceUsage

Read IntegrateServices 
Instance details

Defined in Amazonka.EC2.Types.IntegrateServices

Read InterfacePermissionType 
Instance details

Defined in Amazonka.EC2.Types.InterfacePermissionType

Read InterfaceProtocolType 
Instance details

Defined in Amazonka.EC2.Types.InterfaceProtocolType

Read InternetGateway 
Instance details

Defined in Amazonka.EC2.Types.InternetGateway

Read InternetGatewayAttachment 
Instance details

Defined in Amazonka.EC2.Types.InternetGatewayAttachment

Read IpAddressType 
Instance details

Defined in Amazonka.EC2.Types.IpAddressType

Read IpPermission 
Instance details

Defined in Amazonka.EC2.Types.IpPermission

Read IpRange 
Instance details

Defined in Amazonka.EC2.Types.IpRange

Read Ipam 
Instance details

Defined in Amazonka.EC2.Types.Ipam

Read IpamAddressHistoryRecord 
Instance details

Defined in Amazonka.EC2.Types.IpamAddressHistoryRecord

Read IpamAddressHistoryResourceType 
Instance details

Defined in Amazonka.EC2.Types.IpamAddressHistoryResourceType

Read IpamCidrAuthorizationContext 
Instance details

Defined in Amazonka.EC2.Types.IpamCidrAuthorizationContext

Read IpamComplianceStatus 
Instance details

Defined in Amazonka.EC2.Types.IpamComplianceStatus

Read IpamManagementState 
Instance details

Defined in Amazonka.EC2.Types.IpamManagementState

Read IpamOperatingRegion 
Instance details

Defined in Amazonka.EC2.Types.IpamOperatingRegion

Read IpamOverlapStatus 
Instance details

Defined in Amazonka.EC2.Types.IpamOverlapStatus

Read IpamPool 
Instance details

Defined in Amazonka.EC2.Types.IpamPool

Read IpamPoolAllocation 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolAllocation

Read IpamPoolAllocationResourceType 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolAllocationResourceType

Read IpamPoolAwsService 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolAwsService

Read IpamPoolCidr 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolCidr

Read IpamPoolCidrFailureCode 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolCidrFailureCode

Read IpamPoolCidrFailureReason 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolCidrFailureReason

Read IpamPoolCidrState 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolCidrState

Read IpamPoolState 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolState

Read IpamResourceCidr 
Instance details

Defined in Amazonka.EC2.Types.IpamResourceCidr

Read IpamResourceTag 
Instance details

Defined in Amazonka.EC2.Types.IpamResourceTag

Read IpamResourceType 
Instance details

Defined in Amazonka.EC2.Types.IpamResourceType

Read IpamScope 
Instance details

Defined in Amazonka.EC2.Types.IpamScope

Read IpamScopeState 
Instance details

Defined in Amazonka.EC2.Types.IpamScopeState

Read IpamScopeType 
Instance details

Defined in Amazonka.EC2.Types.IpamScopeType

Read IpamState 
Instance details

Defined in Amazonka.EC2.Types.IpamState

Read Ipv4PrefixSpecification 
Instance details

Defined in Amazonka.EC2.Types.Ipv4PrefixSpecification

Read Ipv4PrefixSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.Ipv4PrefixSpecificationRequest

Read Ipv4PrefixSpecificationResponse 
Instance details

Defined in Amazonka.EC2.Types.Ipv4PrefixSpecificationResponse

Read Ipv6CidrAssociation 
Instance details

Defined in Amazonka.EC2.Types.Ipv6CidrAssociation

Read Ipv6CidrBlock 
Instance details

Defined in Amazonka.EC2.Types.Ipv6CidrBlock

Read Ipv6Pool 
Instance details

Defined in Amazonka.EC2.Types.Ipv6Pool

Read Ipv6PrefixSpecification 
Instance details

Defined in Amazonka.EC2.Types.Ipv6PrefixSpecification

Read Ipv6PrefixSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.Ipv6PrefixSpecificationRequest

Read Ipv6PrefixSpecificationResponse 
Instance details

Defined in Amazonka.EC2.Types.Ipv6PrefixSpecificationResponse

Read Ipv6Range 
Instance details

Defined in Amazonka.EC2.Types.Ipv6Range

Read Ipv6SupportValue 
Instance details

Defined in Amazonka.EC2.Types.Ipv6SupportValue

Read KeyFormat 
Instance details

Defined in Amazonka.EC2.Types.KeyFormat

Read KeyPairInfo 
Instance details

Defined in Amazonka.EC2.Types.KeyPairInfo

Read KeyType 
Instance details

Defined in Amazonka.EC2.Types.KeyType

Read LastError 
Instance details

Defined in Amazonka.EC2.Types.LastError

Read LaunchPermission 
Instance details

Defined in Amazonka.EC2.Types.LaunchPermission

Read LaunchPermissionModifications 
Instance details

Defined in Amazonka.EC2.Types.LaunchPermissionModifications

Read LaunchSpecification 
Instance details

Defined in Amazonka.EC2.Types.LaunchSpecification

Read LaunchTemplate 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplate

Read LaunchTemplateAndOverridesResponse 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateAndOverridesResponse

Read LaunchTemplateAutoRecoveryState 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateAutoRecoveryState

Read LaunchTemplateBlockDeviceMapping 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateBlockDeviceMapping

Read LaunchTemplateBlockDeviceMappingRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateBlockDeviceMappingRequest

Read LaunchTemplateCapacityReservationSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateCapacityReservationSpecificationRequest

Read LaunchTemplateCapacityReservationSpecificationResponse 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateCapacityReservationSpecificationResponse

Read LaunchTemplateConfig 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateConfig

Read LaunchTemplateCpuOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateCpuOptions

Read LaunchTemplateCpuOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateCpuOptionsRequest

Read LaunchTemplateEbsBlockDevice 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateEbsBlockDevice

Read LaunchTemplateEbsBlockDeviceRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateEbsBlockDeviceRequest

Read LaunchTemplateElasticInferenceAccelerator 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateElasticInferenceAccelerator

Read LaunchTemplateElasticInferenceAcceleratorResponse 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateElasticInferenceAcceleratorResponse

Read LaunchTemplateEnclaveOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateEnclaveOptions

Read LaunchTemplateEnclaveOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateEnclaveOptionsRequest

Read LaunchTemplateErrorCode 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateErrorCode

Read LaunchTemplateHibernationOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateHibernationOptions

Read LaunchTemplateHibernationOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateHibernationOptionsRequest

Read LaunchTemplateHttpTokensState 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateHttpTokensState

Read LaunchTemplateIamInstanceProfileSpecification 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateIamInstanceProfileSpecification

Read LaunchTemplateIamInstanceProfileSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateIamInstanceProfileSpecificationRequest

Read LaunchTemplateInstanceMaintenanceOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMaintenanceOptions

Read LaunchTemplateInstanceMaintenanceOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMaintenanceOptionsRequest

Read LaunchTemplateInstanceMarketOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMarketOptions

Read LaunchTemplateInstanceMarketOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMarketOptionsRequest

Read LaunchTemplateInstanceMetadataEndpointState 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMetadataEndpointState

Read LaunchTemplateInstanceMetadataOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMetadataOptions

Read LaunchTemplateInstanceMetadataOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMetadataOptionsRequest

Read LaunchTemplateInstanceMetadataOptionsState 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMetadataOptionsState

Read LaunchTemplateInstanceMetadataProtocolIpv6 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMetadataProtocolIpv6

Read LaunchTemplateInstanceMetadataTagsState 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMetadataTagsState

Read LaunchTemplateInstanceNetworkInterfaceSpecification 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceNetworkInterfaceSpecification

Read LaunchTemplateInstanceNetworkInterfaceSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceNetworkInterfaceSpecificationRequest

Read LaunchTemplateLicenseConfiguration 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateLicenseConfiguration

Read LaunchTemplateLicenseConfigurationRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateLicenseConfigurationRequest

Read LaunchTemplateOverrides 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateOverrides

Read LaunchTemplatePlacement 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplatePlacement

Read LaunchTemplatePlacementRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplatePlacementRequest

Read LaunchTemplatePrivateDnsNameOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplatePrivateDnsNameOptions

Read LaunchTemplatePrivateDnsNameOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplatePrivateDnsNameOptionsRequest

Read LaunchTemplateSpecification 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateSpecification

Read LaunchTemplateSpotMarketOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateSpotMarketOptions

Read LaunchTemplateSpotMarketOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateSpotMarketOptionsRequest

Read LaunchTemplateTagSpecification 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateTagSpecification

Read LaunchTemplateTagSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateTagSpecificationRequest

Read LaunchTemplateVersion 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateVersion

Read LaunchTemplatesMonitoring 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplatesMonitoring

Read LaunchTemplatesMonitoringRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplatesMonitoringRequest

Read LicenseConfiguration 
Instance details

Defined in Amazonka.EC2.Types.LicenseConfiguration

Read LicenseConfigurationRequest 
Instance details

Defined in Amazonka.EC2.Types.LicenseConfigurationRequest

Read ListingState 
Instance details

Defined in Amazonka.EC2.Types.ListingState

Read ListingStatus 
Instance details

Defined in Amazonka.EC2.Types.ListingStatus

Read LoadBalancersConfig 
Instance details

Defined in Amazonka.EC2.Types.LoadBalancersConfig

Read LoadPermission 
Instance details

Defined in Amazonka.EC2.Types.LoadPermission

Read LoadPermissionModifications 
Instance details

Defined in Amazonka.EC2.Types.LoadPermissionModifications

Read LoadPermissionRequest 
Instance details

Defined in Amazonka.EC2.Types.LoadPermissionRequest

Read LocalGateway 
Instance details

Defined in Amazonka.EC2.Types.LocalGateway

Read LocalGatewayRoute 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRoute

Read LocalGatewayRouteState 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRouteState

Read LocalGatewayRouteTable 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRouteTable

Read LocalGatewayRouteTableMode 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRouteTableMode

Read LocalGatewayRouteTableVirtualInterfaceGroupAssociation 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRouteTableVirtualInterfaceGroupAssociation

Read LocalGatewayRouteTableVpcAssociation 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRouteTableVpcAssociation

Read LocalGatewayRouteType 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRouteType

Read LocalGatewayVirtualInterface 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayVirtualInterface

Read LocalGatewayVirtualInterfaceGroup 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayVirtualInterfaceGroup

Read LocalStorage 
Instance details

Defined in Amazonka.EC2.Types.LocalStorage

Read LocalStorageType 
Instance details

Defined in Amazonka.EC2.Types.LocalStorageType

Read LocationType 
Instance details

Defined in Amazonka.EC2.Types.LocationType

Read LogDestinationType 
Instance details

Defined in Amazonka.EC2.Types.LogDestinationType

Read ManagedPrefixList 
Instance details

Defined in Amazonka.EC2.Types.ManagedPrefixList

Read MarketType 
Instance details

Defined in Amazonka.EC2.Types.MarketType

Read MembershipType 
Instance details

Defined in Amazonka.EC2.Types.MembershipType

Read MemoryGiBPerVCpu 
Instance details

Defined in Amazonka.EC2.Types.MemoryGiBPerVCpu

Read MemoryGiBPerVCpuRequest 
Instance details

Defined in Amazonka.EC2.Types.MemoryGiBPerVCpuRequest

Read MemoryInfo 
Instance details

Defined in Amazonka.EC2.Types.MemoryInfo

Read MemoryMiB 
Instance details

Defined in Amazonka.EC2.Types.MemoryMiB

Read MemoryMiBRequest 
Instance details

Defined in Amazonka.EC2.Types.MemoryMiBRequest

Read MetricPoint 
Instance details

Defined in Amazonka.EC2.Types.MetricPoint

Read MetricType 
Instance details

Defined in Amazonka.EC2.Types.MetricType

Read ModifyAvailabilityZoneOptInStatus 
Instance details

Defined in Amazonka.EC2.Types.ModifyAvailabilityZoneOptInStatus

Read ModifyTransitGatewayOptions 
Instance details

Defined in Amazonka.EC2.Types.ModifyTransitGatewayOptions

Read ModifyTransitGatewayVpcAttachmentRequestOptions 
Instance details

Defined in Amazonka.EC2.Types.ModifyTransitGatewayVpcAttachmentRequestOptions

Read ModifyVerifiedAccessEndpointEniOptions 
Instance details

Defined in Amazonka.EC2.Types.ModifyVerifiedAccessEndpointEniOptions

Read ModifyVerifiedAccessEndpointLoadBalancerOptions 
Instance details

Defined in Amazonka.EC2.Types.ModifyVerifiedAccessEndpointLoadBalancerOptions

Read ModifyVerifiedAccessTrustProviderOidcOptions 
Instance details

Defined in Amazonka.EC2.Types.ModifyVerifiedAccessTrustProviderOidcOptions

Read ModifyVpnTunnelOptionsSpecification 
Instance details

Defined in Amazonka.EC2.Types.ModifyVpnTunnelOptionsSpecification

Read Monitoring 
Instance details

Defined in Amazonka.EC2.Types.Monitoring

Read MonitoringState 
Instance details

Defined in Amazonka.EC2.Types.MonitoringState

Read MoveStatus 
Instance details

Defined in Amazonka.EC2.Types.MoveStatus

Read MovingAddressStatus 
Instance details

Defined in Amazonka.EC2.Types.MovingAddressStatus

Read MulticastSupportValue 
Instance details

Defined in Amazonka.EC2.Types.MulticastSupportValue

Read NatGateway 
Instance details

Defined in Amazonka.EC2.Types.NatGateway

Read NatGatewayAddress 
Instance details

Defined in Amazonka.EC2.Types.NatGatewayAddress

Read NatGatewayState 
Instance details

Defined in Amazonka.EC2.Types.NatGatewayState

Read NetworkAcl 
Instance details

Defined in Amazonka.EC2.Types.NetworkAcl

Read NetworkAclAssociation 
Instance details

Defined in Amazonka.EC2.Types.NetworkAclAssociation

Read NetworkAclEntry 
Instance details

Defined in Amazonka.EC2.Types.NetworkAclEntry

Read NetworkBandwidthGbps 
Instance details

Defined in Amazonka.EC2.Types.NetworkBandwidthGbps

Read NetworkBandwidthGbpsRequest 
Instance details

Defined in Amazonka.EC2.Types.NetworkBandwidthGbpsRequest

Read NetworkCardInfo 
Instance details

Defined in Amazonka.EC2.Types.NetworkCardInfo

Read NetworkInfo 
Instance details

Defined in Amazonka.EC2.Types.NetworkInfo

Read NetworkInsightsAccessScope 
Instance details

Defined in Amazonka.EC2.Types.NetworkInsightsAccessScope

Read NetworkInsightsAccessScopeAnalysis 
Instance details

Defined in Amazonka.EC2.Types.NetworkInsightsAccessScopeAnalysis

Read NetworkInsightsAccessScopeContent 
Instance details

Defined in Amazonka.EC2.Types.NetworkInsightsAccessScopeContent

Read NetworkInsightsAnalysis 
Instance details

Defined in Amazonka.EC2.Types.NetworkInsightsAnalysis

Read NetworkInsightsPath 
Instance details

Defined in Amazonka.EC2.Types.NetworkInsightsPath

Read NetworkInterface 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterface

Read NetworkInterfaceAssociation 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceAssociation

Read NetworkInterfaceAttachment 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceAttachment

Read NetworkInterfaceAttachmentChanges 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceAttachmentChanges

Read NetworkInterfaceAttribute 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceAttribute

Read NetworkInterfaceCount 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceCount

Read NetworkInterfaceCountRequest 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceCountRequest

Read NetworkInterfaceCreationType 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceCreationType

Read NetworkInterfaceIpv6Address 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceIpv6Address

Read NetworkInterfacePermission 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfacePermission

Read NetworkInterfacePermissionState 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfacePermissionState

Read NetworkInterfacePermissionStateCode 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfacePermissionStateCode

Read NetworkInterfacePrivateIpAddress 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfacePrivateIpAddress

Read NetworkInterfaceStatus 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceStatus

Read NetworkInterfaceType 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceType

Read NewDhcpConfiguration 
Instance details

Defined in Amazonka.EC2.Types.NewDhcpConfiguration

Read OfferingClassType 
Instance details

Defined in Amazonka.EC2.Types.OfferingClassType

Read OfferingTypeValues 
Instance details

Defined in Amazonka.EC2.Types.OfferingTypeValues

Read OidcOptions 
Instance details

Defined in Amazonka.EC2.Types.OidcOptions

Read OnDemandAllocationStrategy 
Instance details

Defined in Amazonka.EC2.Types.OnDemandAllocationStrategy

Read OnDemandOptions 
Instance details

Defined in Amazonka.EC2.Types.OnDemandOptions

Read OnDemandOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.OnDemandOptionsRequest

Read OperationType 
Instance details

Defined in Amazonka.EC2.Types.OperationType

Read PacketHeaderStatement 
Instance details

Defined in Amazonka.EC2.Types.PacketHeaderStatement

Read PacketHeaderStatementRequest 
Instance details

Defined in Amazonka.EC2.Types.PacketHeaderStatementRequest

Read PartitionLoadFrequency 
Instance details

Defined in Amazonka.EC2.Types.PartitionLoadFrequency

Read PathComponent 
Instance details

Defined in Amazonka.EC2.Types.PathComponent

Read PathStatement 
Instance details

Defined in Amazonka.EC2.Types.PathStatement

Read PathStatementRequest 
Instance details

Defined in Amazonka.EC2.Types.PathStatementRequest

Read PayerResponsibility 
Instance details

Defined in Amazonka.EC2.Types.PayerResponsibility

Read PaymentOption 
Instance details

Defined in Amazonka.EC2.Types.PaymentOption

Read PciId 
Instance details

Defined in Amazonka.EC2.Types.PciId

Read PeeringAttachmentStatus 
Instance details

Defined in Amazonka.EC2.Types.PeeringAttachmentStatus

Read PeeringConnectionOptions 
Instance details

Defined in Amazonka.EC2.Types.PeeringConnectionOptions

Read PeeringConnectionOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.PeeringConnectionOptionsRequest

Read PeeringTgwInfo 
Instance details

Defined in Amazonka.EC2.Types.PeeringTgwInfo

Read PeriodType 
Instance details

Defined in Amazonka.EC2.Types.PeriodType

Read PermissionGroup 
Instance details

Defined in Amazonka.EC2.Types.PermissionGroup

Read Phase1DHGroupNumbersListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase1DHGroupNumbersListValue

Read Phase1DHGroupNumbersRequestListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase1DHGroupNumbersRequestListValue

Read Phase1EncryptionAlgorithmsListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase1EncryptionAlgorithmsListValue

Read Phase1EncryptionAlgorithmsRequestListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase1EncryptionAlgorithmsRequestListValue

Read Phase1IntegrityAlgorithmsListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase1IntegrityAlgorithmsListValue

Read Phase1IntegrityAlgorithmsRequestListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase1IntegrityAlgorithmsRequestListValue

Read Phase2DHGroupNumbersListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase2DHGroupNumbersListValue

Read Phase2DHGroupNumbersRequestListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase2DHGroupNumbersRequestListValue

Read Phase2EncryptionAlgorithmsListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase2EncryptionAlgorithmsListValue

Read Phase2EncryptionAlgorithmsRequestListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase2EncryptionAlgorithmsRequestListValue

Read Phase2IntegrityAlgorithmsListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase2IntegrityAlgorithmsListValue

Read Phase2IntegrityAlgorithmsRequestListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase2IntegrityAlgorithmsRequestListValue

Read Placement 
Instance details

Defined in Amazonka.EC2.Types.Placement

Read PlacementGroup 
Instance details

Defined in Amazonka.EC2.Types.PlacementGroup

Read PlacementGroupInfo 
Instance details

Defined in Amazonka.EC2.Types.PlacementGroupInfo

Read PlacementGroupState 
Instance details

Defined in Amazonka.EC2.Types.PlacementGroupState

Read PlacementGroupStrategy 
Instance details

Defined in Amazonka.EC2.Types.PlacementGroupStrategy

Read PlacementResponse 
Instance details

Defined in Amazonka.EC2.Types.PlacementResponse

Read PlacementStrategy 
Instance details

Defined in Amazonka.EC2.Types.PlacementStrategy

Read PlatformValues 
Instance details

Defined in Amazonka.EC2.Types.PlatformValues

Read PoolCidrBlock 
Instance details

Defined in Amazonka.EC2.Types.PoolCidrBlock

Read PortRange 
Instance details

Defined in Amazonka.EC2.Types.PortRange

Read PrefixList 
Instance details

Defined in Amazonka.EC2.Types.PrefixList

Read PrefixListAssociation 
Instance details

Defined in Amazonka.EC2.Types.PrefixListAssociation

Read PrefixListEntry 
Instance details

Defined in Amazonka.EC2.Types.PrefixListEntry

Read PrefixListId 
Instance details

Defined in Amazonka.EC2.Types.PrefixListId

Read PrefixListState 
Instance details

Defined in Amazonka.EC2.Types.PrefixListState

Read PriceSchedule 
Instance details

Defined in Amazonka.EC2.Types.PriceSchedule

Read PriceScheduleSpecification 
Instance details

Defined in Amazonka.EC2.Types.PriceScheduleSpecification

Read PricingDetail 
Instance details

Defined in Amazonka.EC2.Types.PricingDetail

Read PrincipalIdFormat 
Instance details

Defined in Amazonka.EC2.Types.PrincipalIdFormat

Read PrincipalType 
Instance details

Defined in Amazonka.EC2.Types.PrincipalType

Read PrivateDnsDetails 
Instance details

Defined in Amazonka.EC2.Types.PrivateDnsDetails

Read PrivateDnsNameConfiguration 
Instance details

Defined in Amazonka.EC2.Types.PrivateDnsNameConfiguration

Read PrivateDnsNameOptionsOnLaunch 
Instance details

Defined in Amazonka.EC2.Types.PrivateDnsNameOptionsOnLaunch

Read PrivateDnsNameOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.PrivateDnsNameOptionsRequest

Read PrivateDnsNameOptionsResponse 
Instance details

Defined in Amazonka.EC2.Types.PrivateDnsNameOptionsResponse

Read PrivateIpAddressSpecification 
Instance details

Defined in Amazonka.EC2.Types.PrivateIpAddressSpecification

Read ProcessorInfo 
Instance details

Defined in Amazonka.EC2.Types.ProcessorInfo

Read ProductCode 
Instance details

Defined in Amazonka.EC2.Types.ProductCode

Read ProductCodeValues 
Instance details

Defined in Amazonka.EC2.Types.ProductCodeValues

Read PropagatingVgw 
Instance details

Defined in Amazonka.EC2.Types.PropagatingVgw

Read Protocol 
Instance details

Defined in Amazonka.EC2.Types.Protocol

Read ProtocolValue 
Instance details

Defined in Amazonka.EC2.Types.ProtocolValue

Read ProvisionedBandwidth 
Instance details

Defined in Amazonka.EC2.Types.ProvisionedBandwidth

Read PtrUpdateStatus 
Instance details

Defined in Amazonka.EC2.Types.PtrUpdateStatus

Read PublicIpv4Pool 
Instance details

Defined in Amazonka.EC2.Types.PublicIpv4Pool

Read PublicIpv4PoolRange 
Instance details

Defined in Amazonka.EC2.Types.PublicIpv4PoolRange

Read Purchase 
Instance details

Defined in Amazonka.EC2.Types.Purchase

Read PurchaseRequest 
Instance details

Defined in Amazonka.EC2.Types.PurchaseRequest

Read RIProductDescription 
Instance details

Defined in Amazonka.EC2.Types.RIProductDescription

Read RecurringCharge 
Instance details

Defined in Amazonka.EC2.Types.RecurringCharge

Read RecurringChargeFrequency 
Instance details

Defined in Amazonka.EC2.Types.RecurringChargeFrequency

Read ReferencedSecurityGroup 
Instance details

Defined in Amazonka.EC2.Types.ReferencedSecurityGroup

Read RegionInfo 
Instance details

Defined in Amazonka.EC2.Types.RegionInfo

Read RegisterInstanceTagAttributeRequest 
Instance details

Defined in Amazonka.EC2.Types.RegisterInstanceTagAttributeRequest

Read RemoveIpamOperatingRegion 
Instance details

Defined in Amazonka.EC2.Types.RemoveIpamOperatingRegion

Read RemovePrefixListEntry 
Instance details

Defined in Amazonka.EC2.Types.RemovePrefixListEntry

Read ReplaceRootVolumeTask 
Instance details

Defined in Amazonka.EC2.Types.ReplaceRootVolumeTask

Read ReplaceRootVolumeTaskState 
Instance details

Defined in Amazonka.EC2.Types.ReplaceRootVolumeTaskState

Read ReplacementStrategy 
Instance details

Defined in Amazonka.EC2.Types.ReplacementStrategy

Read ReportInstanceReasonCodes 
Instance details

Defined in Amazonka.EC2.Types.ReportInstanceReasonCodes

Read ReportStatusType 
Instance details

Defined in Amazonka.EC2.Types.ReportStatusType

Read RequestIpamResourceTag 
Instance details

Defined in Amazonka.EC2.Types.RequestIpamResourceTag

Read RequestSpotLaunchSpecification 
Instance details

Defined in Amazonka.EC2.Types.RequestSpotLaunchSpecification

Read Reservation 
Instance details

Defined in Amazonka.EC2.Types.Reservation

Read ReservationFleetInstanceSpecification 
Instance details

Defined in Amazonka.EC2.Types.ReservationFleetInstanceSpecification

Read ReservationState 
Instance details

Defined in Amazonka.EC2.Types.ReservationState

Read ReservationValue 
Instance details

Defined in Amazonka.EC2.Types.ReservationValue

Read ReservedInstanceLimitPrice 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstanceLimitPrice

Read ReservedInstanceReservationValue 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstanceReservationValue

Read ReservedInstanceState 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstanceState

Read ReservedInstances 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstances

Read ReservedInstancesConfiguration 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstancesConfiguration

Read ReservedInstancesId 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstancesId

Read ReservedInstancesListing 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstancesListing

Read ReservedInstancesModification 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstancesModification

Read ReservedInstancesModificationResult 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstancesModificationResult

Read ReservedInstancesOffering 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstancesOffering

Read ResetFpgaImageAttributeName 
Instance details

Defined in Amazonka.EC2.Types.ResetFpgaImageAttributeName

Read ResetImageAttributeName 
Instance details

Defined in Amazonka.EC2.Types.ResetImageAttributeName

Read ResourceStatement 
Instance details

Defined in Amazonka.EC2.Types.ResourceStatement

Read ResourceStatementRequest 
Instance details

Defined in Amazonka.EC2.Types.ResourceStatementRequest

Read ResourceType 
Instance details

Defined in Amazonka.EC2.Types.ResourceType

Read ResponseError 
Instance details

Defined in Amazonka.EC2.Types.ResponseError

Read ResponseLaunchTemplateData 
Instance details

Defined in Amazonka.EC2.Types.ResponseLaunchTemplateData

Read RootDeviceType 
Instance details

Defined in Amazonka.EC2.Types.RootDeviceType

Read Route 
Instance details

Defined in Amazonka.EC2.Types.Route

Read RouteOrigin 
Instance details

Defined in Amazonka.EC2.Types.RouteOrigin

Read RouteState 
Instance details

Defined in Amazonka.EC2.Types.RouteState

Read RouteTable 
Instance details

Defined in Amazonka.EC2.Types.RouteTable

Read RouteTableAssociation 
Instance details

Defined in Amazonka.EC2.Types.RouteTableAssociation

Read RouteTableAssociationState 
Instance details

Defined in Amazonka.EC2.Types.RouteTableAssociationState

Read RouteTableAssociationStateCode 
Instance details

Defined in Amazonka.EC2.Types.RouteTableAssociationStateCode

Read RuleAction 
Instance details

Defined in Amazonka.EC2.Types.RuleAction

Read RunInstancesMonitoringEnabled 
Instance details

Defined in Amazonka.EC2.Types.RunInstancesMonitoringEnabled

Read S3ObjectTag 
Instance details

Defined in Amazonka.EC2.Types.S3ObjectTag

Read S3Storage 
Instance details

Defined in Amazonka.EC2.Types.S3Storage

Read ScheduledInstance 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstance

Read ScheduledInstanceAvailability 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstanceAvailability

Read ScheduledInstanceRecurrence 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstanceRecurrence

Read ScheduledInstanceRecurrenceRequest 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstanceRecurrenceRequest

Read ScheduledInstancesBlockDeviceMapping 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesBlockDeviceMapping

Read ScheduledInstancesEbs 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesEbs

Read ScheduledInstancesIamInstanceProfile 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesIamInstanceProfile

Read ScheduledInstancesIpv6Address 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesIpv6Address

Read ScheduledInstancesLaunchSpecification 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesLaunchSpecification

Read ScheduledInstancesMonitoring 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesMonitoring

Read ScheduledInstancesNetworkInterface 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesNetworkInterface

Read ScheduledInstancesPlacement 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesPlacement

Read ScheduledInstancesPrivateIpAddressConfig 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesPrivateIpAddressConfig

Read Scope 
Instance details

Defined in Amazonka.EC2.Types.Scope

Read SecurityGroup 
Instance details

Defined in Amazonka.EC2.Types.SecurityGroup

Read SecurityGroupIdentifier 
Instance details

Defined in Amazonka.EC2.Types.SecurityGroupIdentifier

Read SecurityGroupReference 
Instance details

Defined in Amazonka.EC2.Types.SecurityGroupReference

Read SecurityGroupRule 
Instance details

Defined in Amazonka.EC2.Types.SecurityGroupRule

Read SecurityGroupRuleDescription 
Instance details

Defined in Amazonka.EC2.Types.SecurityGroupRuleDescription

Read SecurityGroupRuleRequest 
Instance details

Defined in Amazonka.EC2.Types.SecurityGroupRuleRequest

Read SecurityGroupRuleUpdate 
Instance details

Defined in Amazonka.EC2.Types.SecurityGroupRuleUpdate

Read SelfServicePortal 
Instance details

Defined in Amazonka.EC2.Types.SelfServicePortal

Read ServiceConfiguration 
Instance details

Defined in Amazonka.EC2.Types.ServiceConfiguration

Read ServiceConnectivityType 
Instance details

Defined in Amazonka.EC2.Types.ServiceConnectivityType

Read ServiceDetail 
Instance details

Defined in Amazonka.EC2.Types.ServiceDetail

Read ServiceState 
Instance details

Defined in Amazonka.EC2.Types.ServiceState

Read ServiceType 
Instance details

Defined in Amazonka.EC2.Types.ServiceType

Read ServiceTypeDetail 
Instance details

Defined in Amazonka.EC2.Types.ServiceTypeDetail

Read ShutdownBehavior 
Instance details

Defined in Amazonka.EC2.Types.ShutdownBehavior

Read SlotDateTimeRangeRequest 
Instance details

Defined in Amazonka.EC2.Types.SlotDateTimeRangeRequest

Read SlotStartTimeRangeRequest 
Instance details

Defined in Amazonka.EC2.Types.SlotStartTimeRangeRequest

Read Snapshot 
Instance details

Defined in Amazonka.EC2.Types.Snapshot

Read SnapshotAttributeName 
Instance details

Defined in Amazonka.EC2.Types.SnapshotAttributeName

Read SnapshotDetail 
Instance details

Defined in Amazonka.EC2.Types.SnapshotDetail

Read SnapshotDiskContainer 
Instance details

Defined in Amazonka.EC2.Types.SnapshotDiskContainer

Read SnapshotInfo 
Instance details

Defined in Amazonka.EC2.Types.SnapshotInfo

Read SnapshotRecycleBinInfo 
Instance details

Defined in Amazonka.EC2.Types.SnapshotRecycleBinInfo

Read SnapshotState 
Instance details

Defined in Amazonka.EC2.Types.SnapshotState

Read SnapshotTaskDetail 
Instance details

Defined in Amazonka.EC2.Types.SnapshotTaskDetail

Read SnapshotTierStatus 
Instance details

Defined in Amazonka.EC2.Types.SnapshotTierStatus

Read SpotAllocationStrategy 
Instance details

Defined in Amazonka.EC2.Types.SpotAllocationStrategy

Read SpotCapacityRebalance 
Instance details

Defined in Amazonka.EC2.Types.SpotCapacityRebalance

Read SpotDatafeedSubscription 
Instance details

Defined in Amazonka.EC2.Types.SpotDatafeedSubscription

Read SpotFleetLaunchSpecification 
Instance details

Defined in Amazonka.EC2.Types.SpotFleetLaunchSpecification

Read SpotFleetMonitoring 
Instance details

Defined in Amazonka.EC2.Types.SpotFleetMonitoring

Read SpotFleetRequestConfig 
Instance details

Defined in Amazonka.EC2.Types.SpotFleetRequestConfig

Read SpotFleetRequestConfigData 
Instance details

Defined in Amazonka.EC2.Types.SpotFleetRequestConfigData

Read SpotFleetTagSpecification 
Instance details

Defined in Amazonka.EC2.Types.SpotFleetTagSpecification

Read SpotInstanceInterruptionBehavior 
Instance details

Defined in Amazonka.EC2.Types.SpotInstanceInterruptionBehavior

Read SpotInstanceRequest 
Instance details

Defined in Amazonka.EC2.Types.SpotInstanceRequest

Read SpotInstanceState 
Instance details

Defined in Amazonka.EC2.Types.SpotInstanceState

Read SpotInstanceStateFault 
Instance details

Defined in Amazonka.EC2.Types.SpotInstanceStateFault

Read SpotInstanceStatus 
Instance details

Defined in Amazonka.EC2.Types.SpotInstanceStatus

Read SpotInstanceType 
Instance details

Defined in Amazonka.EC2.Types.SpotInstanceType

Read SpotMaintenanceStrategies 
Instance details

Defined in Amazonka.EC2.Types.SpotMaintenanceStrategies

Read SpotMarketOptions 
Instance details

Defined in Amazonka.EC2.Types.SpotMarketOptions

Read SpotOptions 
Instance details

Defined in Amazonka.EC2.Types.SpotOptions

Read SpotOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.SpotOptionsRequest

Read SpotPlacement 
Instance details

Defined in Amazonka.EC2.Types.SpotPlacement

Read SpotPlacementScore 
Instance details

Defined in Amazonka.EC2.Types.SpotPlacementScore

Read SpotPrice 
Instance details

Defined in Amazonka.EC2.Types.SpotPrice

Read SpreadLevel 
Instance details

Defined in Amazonka.EC2.Types.SpreadLevel

Read StaleIpPermission 
Instance details

Defined in Amazonka.EC2.Types.StaleIpPermission

Read StaleSecurityGroup 
Instance details

Defined in Amazonka.EC2.Types.StaleSecurityGroup

Read State 
Instance details

Defined in Amazonka.EC2.Types.State

Read StateReason 
Instance details

Defined in Amazonka.EC2.Types.StateReason

Read StaticSourcesSupportValue 
Instance details

Defined in Amazonka.EC2.Types.StaticSourcesSupportValue

Read StatisticType 
Instance details

Defined in Amazonka.EC2.Types.StatisticType

Read StatusName 
Instance details

Defined in Amazonka.EC2.Types.StatusName

Read StatusType 
Instance details

Defined in Amazonka.EC2.Types.StatusType

Read Storage 
Instance details

Defined in Amazonka.EC2.Types.Storage

Read StorageLocation 
Instance details

Defined in Amazonka.EC2.Types.StorageLocation

Read StorageTier 
Instance details

Defined in Amazonka.EC2.Types.StorageTier

Read StoreImageTaskResult 
Instance details

Defined in Amazonka.EC2.Types.StoreImageTaskResult

Read Subnet 
Instance details

Defined in Amazonka.EC2.Types.Subnet

Read SubnetAssociation 
Instance details

Defined in Amazonka.EC2.Types.SubnetAssociation

Read SubnetCidrBlockState 
Instance details

Defined in Amazonka.EC2.Types.SubnetCidrBlockState

Read SubnetCidrBlockStateCode 
Instance details

Defined in Amazonka.EC2.Types.SubnetCidrBlockStateCode

Read SubnetCidrReservation 
Instance details

Defined in Amazonka.EC2.Types.SubnetCidrReservation

Read SubnetCidrReservationType 
Instance details

Defined in Amazonka.EC2.Types.SubnetCidrReservationType

Read SubnetIpv6CidrBlockAssociation 
Instance details

Defined in Amazonka.EC2.Types.SubnetIpv6CidrBlockAssociation

Read SubnetState 
Instance details

Defined in Amazonka.EC2.Types.SubnetState

Read Subscription 
Instance details

Defined in Amazonka.EC2.Types.Subscription

Read SuccessfulInstanceCreditSpecificationItem 
Instance details

Defined in Amazonka.EC2.Types.SuccessfulInstanceCreditSpecificationItem

Read SuccessfulQueuedPurchaseDeletion 
Instance details

Defined in Amazonka.EC2.Types.SuccessfulQueuedPurchaseDeletion

Read SummaryStatus 
Instance details

Defined in Amazonka.EC2.Types.SummaryStatus

Read Tag 
Instance details

Defined in Amazonka.EC2.Types.Tag

Read TagDescription 
Instance details

Defined in Amazonka.EC2.Types.TagDescription

Read TagSpecification 
Instance details

Defined in Amazonka.EC2.Types.TagSpecification

Read TargetCapacitySpecification 
Instance details

Defined in Amazonka.EC2.Types.TargetCapacitySpecification

Read TargetCapacitySpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.TargetCapacitySpecificationRequest

Read TargetCapacityUnitType 
Instance details

Defined in Amazonka.EC2.Types.TargetCapacityUnitType

Read TargetConfiguration 
Instance details

Defined in Amazonka.EC2.Types.TargetConfiguration

Read TargetConfigurationRequest 
Instance details

Defined in Amazonka.EC2.Types.TargetConfigurationRequest

Read TargetGroup 
Instance details

Defined in Amazonka.EC2.Types.TargetGroup

Read TargetGroupsConfig 
Instance details

Defined in Amazonka.EC2.Types.TargetGroupsConfig

Read TargetNetwork 
Instance details

Defined in Amazonka.EC2.Types.TargetNetwork

Read TargetReservationValue 
Instance details

Defined in Amazonka.EC2.Types.TargetReservationValue

Read TargetStorageTier 
Instance details

Defined in Amazonka.EC2.Types.TargetStorageTier

Read TelemetryStatus 
Instance details

Defined in Amazonka.EC2.Types.TelemetryStatus

Read Tenancy 
Instance details

Defined in Amazonka.EC2.Types.Tenancy

Read TerminateConnectionStatus 
Instance details

Defined in Amazonka.EC2.Types.TerminateConnectionStatus

Read ThroughResourcesStatement 
Instance details

Defined in Amazonka.EC2.Types.ThroughResourcesStatement

Read ThroughResourcesStatementRequest 
Instance details

Defined in Amazonka.EC2.Types.ThroughResourcesStatementRequest

Read TieringOperationStatus 
Instance details

Defined in Amazonka.EC2.Types.TieringOperationStatus

Read TotalLocalStorageGB 
Instance details

Defined in Amazonka.EC2.Types.TotalLocalStorageGB

Read TotalLocalStorageGBRequest 
Instance details

Defined in Amazonka.EC2.Types.TotalLocalStorageGBRequest

Read TpmSupportValues 
Instance details

Defined in Amazonka.EC2.Types.TpmSupportValues

Read TrafficDirection 
Instance details

Defined in Amazonka.EC2.Types.TrafficDirection

Read TrafficMirrorFilter 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorFilter

Read TrafficMirrorFilterRule 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorFilterRule

Read TrafficMirrorFilterRuleField 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorFilterRuleField

Read TrafficMirrorNetworkService 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorNetworkService

Read TrafficMirrorPortRange 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorPortRange

Read TrafficMirrorPortRangeRequest 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorPortRangeRequest

Read TrafficMirrorRuleAction 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorRuleAction

Read TrafficMirrorSession 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorSession

Read TrafficMirrorSessionField 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorSessionField

Read TrafficMirrorTarget 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorTarget

Read TrafficMirrorTargetType 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorTargetType

Read TrafficType 
Instance details

Defined in Amazonka.EC2.Types.TrafficType

Read TransitGateway 
Instance details

Defined in Amazonka.EC2.Types.TransitGateway

Read TransitGatewayAssociation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAssociation

Read TransitGatewayAssociationState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAssociationState

Read TransitGatewayAttachment 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAttachment

Read TransitGatewayAttachmentAssociation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAttachmentAssociation

Read TransitGatewayAttachmentBgpConfiguration 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAttachmentBgpConfiguration

Read TransitGatewayAttachmentPropagation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAttachmentPropagation

Read TransitGatewayAttachmentResourceType 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAttachmentResourceType

Read TransitGatewayAttachmentState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAttachmentState

Read TransitGatewayConnect 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayConnect

Read TransitGatewayConnectOptions 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayConnectOptions

Read TransitGatewayConnectPeer 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayConnectPeer

Read TransitGatewayConnectPeerConfiguration 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayConnectPeerConfiguration

Read TransitGatewayConnectPeerState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayConnectPeerState

Read TransitGatewayConnectRequestBgpOptions 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayConnectRequestBgpOptions

Read TransitGatewayMulitcastDomainAssociationState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulitcastDomainAssociationState

Read TransitGatewayMulticastDeregisteredGroupMembers 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastDeregisteredGroupMembers

Read TransitGatewayMulticastDeregisteredGroupSources 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastDeregisteredGroupSources

Read TransitGatewayMulticastDomain 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastDomain

Read TransitGatewayMulticastDomainAssociation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastDomainAssociation

Read TransitGatewayMulticastDomainAssociations 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastDomainAssociations

Read TransitGatewayMulticastDomainOptions 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastDomainOptions

Read TransitGatewayMulticastDomainState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastDomainState

Read TransitGatewayMulticastGroup 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastGroup

Read TransitGatewayMulticastRegisteredGroupMembers 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastRegisteredGroupMembers

Read TransitGatewayMulticastRegisteredGroupSources 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastRegisteredGroupSources

Read TransitGatewayOptions 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayOptions

Read TransitGatewayPeeringAttachment 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPeeringAttachment

Read TransitGatewayPeeringAttachmentOptions 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPeeringAttachmentOptions

Read TransitGatewayPolicyRule 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPolicyRule

Read TransitGatewayPolicyRuleMetaData 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPolicyRuleMetaData

Read TransitGatewayPolicyTable 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPolicyTable

Read TransitGatewayPolicyTableAssociation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPolicyTableAssociation

Read TransitGatewayPolicyTableEntry 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPolicyTableEntry

Read TransitGatewayPolicyTableState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPolicyTableState

Read TransitGatewayPrefixListAttachment 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPrefixListAttachment

Read TransitGatewayPrefixListReference 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPrefixListReference

Read TransitGatewayPrefixListReferenceState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPrefixListReferenceState

Read TransitGatewayPropagation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPropagation

Read TransitGatewayPropagationState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPropagationState

Read TransitGatewayRequestOptions 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRequestOptions

Read TransitGatewayRoute 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRoute

Read TransitGatewayRouteAttachment 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteAttachment

Read TransitGatewayRouteState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteState

Read TransitGatewayRouteTable 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTable

Read TransitGatewayRouteTableAnnouncement 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTableAnnouncement

Read TransitGatewayRouteTableAnnouncementDirection 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTableAnnouncementDirection

Read TransitGatewayRouteTableAnnouncementState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTableAnnouncementState

Read TransitGatewayRouteTableAssociation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTableAssociation

Read TransitGatewayRouteTablePropagation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTablePropagation

Read TransitGatewayRouteTableRoute 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTableRoute

Read TransitGatewayRouteTableState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTableState

Read TransitGatewayRouteType 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteType

Read TransitGatewayState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayState

Read TransitGatewayVpcAttachment 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayVpcAttachment

Read TransitGatewayVpcAttachmentOptions 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayVpcAttachmentOptions

Read TransportProtocol 
Instance details

Defined in Amazonka.EC2.Types.TransportProtocol

Read TrunkInterfaceAssociation 
Instance details

Defined in Amazonka.EC2.Types.TrunkInterfaceAssociation

Read TrustProviderType 
Instance details

Defined in Amazonka.EC2.Types.TrustProviderType

Read TunnelInsideIpVersion 
Instance details

Defined in Amazonka.EC2.Types.TunnelInsideIpVersion

Read TunnelOption 
Instance details

Defined in Amazonka.EC2.Types.TunnelOption

Read UnlimitedSupportedInstanceFamily 
Instance details

Defined in Amazonka.EC2.Types.UnlimitedSupportedInstanceFamily

Read UnsuccessfulInstanceCreditSpecificationErrorCode 
Instance details

Defined in Amazonka.EC2.Types.UnsuccessfulInstanceCreditSpecificationErrorCode

Read UnsuccessfulInstanceCreditSpecificationItem 
Instance details

Defined in Amazonka.EC2.Types.UnsuccessfulInstanceCreditSpecificationItem

Read UnsuccessfulInstanceCreditSpecificationItemError 
Instance details

Defined in Amazonka.EC2.Types.UnsuccessfulInstanceCreditSpecificationItemError

Read UnsuccessfulItem 
Instance details

Defined in Amazonka.EC2.Types.UnsuccessfulItem

Read UnsuccessfulItemError 
Instance details

Defined in Amazonka.EC2.Types.UnsuccessfulItemError

Read UsageClassType 
Instance details

Defined in Amazonka.EC2.Types.UsageClassType

Read UserBucket 
Instance details

Defined in Amazonka.EC2.Types.UserBucket

Read UserBucketDetails 
Instance details

Defined in Amazonka.EC2.Types.UserBucketDetails

Read UserIdGroupPair 
Instance details

Defined in Amazonka.EC2.Types.UserIdGroupPair

Read UserTrustProviderType 
Instance details

Defined in Amazonka.EC2.Types.UserTrustProviderType

Read VCpuCountRange 
Instance details

Defined in Amazonka.EC2.Types.VCpuCountRange

Read VCpuCountRangeRequest 
Instance details

Defined in Amazonka.EC2.Types.VCpuCountRangeRequest

Read VCpuInfo 
Instance details

Defined in Amazonka.EC2.Types.VCpuInfo

Read ValidationError 
Instance details

Defined in Amazonka.EC2.Types.ValidationError

Read ValidationWarning 
Instance details

Defined in Amazonka.EC2.Types.ValidationWarning

Read VerifiedAccessEndpoint 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpoint

Read VerifiedAccessEndpointAttachmentType 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointAttachmentType

Read VerifiedAccessEndpointEniOptions 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointEniOptions

Read VerifiedAccessEndpointLoadBalancerOptions 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointLoadBalancerOptions

Read VerifiedAccessEndpointProtocol 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointProtocol

Read VerifiedAccessEndpointStatus 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointStatus

Read VerifiedAccessEndpointStatusCode 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointStatusCode

Read VerifiedAccessEndpointType 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointType

Read VerifiedAccessGroup 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessGroup

Read VerifiedAccessInstance 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessInstance

Read VerifiedAccessInstanceLoggingConfiguration 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessInstanceLoggingConfiguration

Read VerifiedAccessLogCloudWatchLogsDestination 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogCloudWatchLogsDestination

Read VerifiedAccessLogCloudWatchLogsDestinationOptions 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogCloudWatchLogsDestinationOptions

Read VerifiedAccessLogDeliveryStatus 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogDeliveryStatus

Read VerifiedAccessLogDeliveryStatusCode 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogDeliveryStatusCode

Read VerifiedAccessLogKinesisDataFirehoseDestination 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogKinesisDataFirehoseDestination

Read VerifiedAccessLogKinesisDataFirehoseDestinationOptions 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogKinesisDataFirehoseDestinationOptions

Read VerifiedAccessLogOptions 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogOptions

Read VerifiedAccessLogS3Destination 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogS3Destination

Read VerifiedAccessLogS3DestinationOptions 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogS3DestinationOptions

Read VerifiedAccessLogs 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogs

Read VerifiedAccessTrustProvider 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessTrustProvider

Read VerifiedAccessTrustProviderCondensed 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessTrustProviderCondensed

Read VgwTelemetry 
Instance details

Defined in Amazonka.EC2.Types.VgwTelemetry

Read VirtualizationType 
Instance details

Defined in Amazonka.EC2.Types.VirtualizationType

Read Volume 
Instance details

Defined in Amazonka.EC2.Types.Volume

Read VolumeAttachment 
Instance details

Defined in Amazonka.EC2.Types.VolumeAttachment

Read VolumeAttachmentState 
Instance details

Defined in Amazonka.EC2.Types.VolumeAttachmentState

Read VolumeAttributeName 
Instance details

Defined in Amazonka.EC2.Types.VolumeAttributeName

Read VolumeDetail 
Instance details

Defined in Amazonka.EC2.Types.VolumeDetail

Read VolumeModification 
Instance details

Defined in Amazonka.EC2.Types.VolumeModification

Read VolumeModificationState 
Instance details

Defined in Amazonka.EC2.Types.VolumeModificationState

Read VolumeState 
Instance details

Defined in Amazonka.EC2.Types.VolumeState

Read VolumeStatusAction 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusAction

Read VolumeStatusAttachmentStatus 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusAttachmentStatus

Read VolumeStatusDetails 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusDetails

Read VolumeStatusEvent 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusEvent

Read VolumeStatusInfo 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusInfo

Read VolumeStatusInfoStatus 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusInfoStatus

Read VolumeStatusItem 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusItem

Read VolumeStatusName 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusName

Read VolumeType 
Instance details

Defined in Amazonka.EC2.Types.VolumeType

Read Vpc 
Instance details

Defined in Amazonka.EC2.Types.Vpc

Read VpcAttachment 
Instance details

Defined in Amazonka.EC2.Types.VpcAttachment

Read VpcAttributeName 
Instance details

Defined in Amazonka.EC2.Types.VpcAttributeName

Read VpcCidrBlockAssociation 
Instance details

Defined in Amazonka.EC2.Types.VpcCidrBlockAssociation

Read VpcCidrBlockState 
Instance details

Defined in Amazonka.EC2.Types.VpcCidrBlockState

Read VpcCidrBlockStateCode 
Instance details

Defined in Amazonka.EC2.Types.VpcCidrBlockStateCode

Read VpcClassicLink 
Instance details

Defined in Amazonka.EC2.Types.VpcClassicLink

Read VpcEndpoint 
Instance details

Defined in Amazonka.EC2.Types.VpcEndpoint

Read VpcEndpointConnection 
Instance details

Defined in Amazonka.EC2.Types.VpcEndpointConnection

Read VpcEndpointType 
Instance details

Defined in Amazonka.EC2.Types.VpcEndpointType

Read VpcIpv6CidrBlockAssociation 
Instance details

Defined in Amazonka.EC2.Types.VpcIpv6CidrBlockAssociation

Read VpcPeeringConnection 
Instance details

Defined in Amazonka.EC2.Types.VpcPeeringConnection

Read VpcPeeringConnectionOptionsDescription 
Instance details

Defined in Amazonka.EC2.Types.VpcPeeringConnectionOptionsDescription

Read VpcPeeringConnectionStateReason 
Instance details

Defined in Amazonka.EC2.Types.VpcPeeringConnectionStateReason

Read VpcPeeringConnectionStateReasonCode 
Instance details

Defined in Amazonka.EC2.Types.VpcPeeringConnectionStateReasonCode

Read VpcPeeringConnectionVpcInfo 
Instance details

Defined in Amazonka.EC2.Types.VpcPeeringConnectionVpcInfo

Read VpcState 
Instance details

Defined in Amazonka.EC2.Types.VpcState

Read VpcTenancy 
Instance details

Defined in Amazonka.EC2.Types.VpcTenancy

Read VpnConnection 
Instance details

Defined in Amazonka.EC2.Types.VpnConnection

Read VpnConnectionDeviceType 
Instance details

Defined in Amazonka.EC2.Types.VpnConnectionDeviceType

Read VpnConnectionOptions 
Instance details

Defined in Amazonka.EC2.Types.VpnConnectionOptions

Read VpnConnectionOptionsSpecification 
Instance details

Defined in Amazonka.EC2.Types.VpnConnectionOptionsSpecification

Read VpnEcmpSupportValue 
Instance details

Defined in Amazonka.EC2.Types.VpnEcmpSupportValue

Read VpnGateway 
Instance details

Defined in Amazonka.EC2.Types.VpnGateway

Read VpnProtocol 
Instance details

Defined in Amazonka.EC2.Types.VpnProtocol

Read VpnState 
Instance details

Defined in Amazonka.EC2.Types.VpnState

Read VpnStaticRoute 
Instance details

Defined in Amazonka.EC2.Types.VpnStaticRoute

Read VpnStaticRouteSource 
Instance details

Defined in Amazonka.EC2.Types.VpnStaticRouteSource

Read VpnTunnelLogOptions 
Instance details

Defined in Amazonka.EC2.Types.VpnTunnelLogOptions

Read VpnTunnelLogOptionsSpecification 
Instance details

Defined in Amazonka.EC2.Types.VpnTunnelLogOptionsSpecification

Read VpnTunnelOptionsSpecification 
Instance details

Defined in Amazonka.EC2.Types.VpnTunnelOptionsSpecification

Read WeekDay 
Instance details

Defined in Amazonka.EC2.Types.WeekDay

Read AccountLimit 
Instance details

Defined in Amazonka.Lambda.Types.AccountLimit

Read AccountUsage 
Instance details

Defined in Amazonka.Lambda.Types.AccountUsage

Read AliasConfiguration 
Instance details

Defined in Amazonka.Lambda.Types.AliasConfiguration

Read AliasRoutingConfiguration 
Instance details

Defined in Amazonka.Lambda.Types.AliasRoutingConfiguration

Read AllowedPublishers 
Instance details

Defined in Amazonka.Lambda.Types.AllowedPublishers

Read AmazonManagedKafkaEventSourceConfig 
Instance details

Defined in Amazonka.Lambda.Types.AmazonManagedKafkaEventSourceConfig

Read Architecture 
Instance details

Defined in Amazonka.Lambda.Types.Architecture

Read CodeSigningConfig 
Instance details

Defined in Amazonka.Lambda.Types.CodeSigningConfig

Read CodeSigningPolicies 
Instance details

Defined in Amazonka.Lambda.Types.CodeSigningPolicies

Read CodeSigningPolicy 
Instance details

Defined in Amazonka.Lambda.Types.CodeSigningPolicy

Read Concurrency 
Instance details

Defined in Amazonka.Lambda.Types.Concurrency

Read Cors 
Instance details

Defined in Amazonka.Lambda.Types.Cors

Read DeadLetterConfig 
Instance details

Defined in Amazonka.Lambda.Types.DeadLetterConfig

Read DestinationConfig 
Instance details

Defined in Amazonka.Lambda.Types.DestinationConfig

Read EndPointType 
Instance details

Defined in Amazonka.Lambda.Types.EndPointType

Read EphemeralStorage 
Instance details

Defined in Amazonka.Lambda.Types.EphemeralStorage

Read EventSourceMappingConfiguration 
Instance details

Defined in Amazonka.Lambda.Types.EventSourceMappingConfiguration

Read EventSourcePosition 
Instance details

Defined in Amazonka.Lambda.Types.EventSourcePosition

Read FileSystemConfig 
Instance details

Defined in Amazonka.Lambda.Types.FileSystemConfig

Read Filter 
Instance details

Defined in Amazonka.Lambda.Types.Filter

Read FilterCriteria 
Instance details

Defined in Amazonka.Lambda.Types.FilterCriteria

Read FunctionCodeLocation 
Instance details

Defined in Amazonka.Lambda.Types.FunctionCodeLocation

Read FunctionEventInvokeConfig 
Instance details

Defined in Amazonka.Lambda.Types.FunctionEventInvokeConfig

Read FunctionResponseType 
Instance details

Defined in Amazonka.Lambda.Types.FunctionResponseType

Read FunctionUrlAuthType 
Instance details

Defined in Amazonka.Lambda.Types.FunctionUrlAuthType

Read FunctionUrlConfig 
Instance details

Defined in Amazonka.Lambda.Types.FunctionUrlConfig

Read FunctionVersion 
Instance details

Defined in Amazonka.Lambda.Types.FunctionVersion

Read GetLayerVersionResponse 
Instance details

Defined in Amazonka.Lambda.Types.GetLayerVersionResponse

Read ImageConfig 
Instance details

Defined in Amazonka.Lambda.Types.ImageConfig

Read InvocationType 
Instance details

Defined in Amazonka.Lambda.Types.InvocationType

Read LastUpdateStatus 
Instance details

Defined in Amazonka.Lambda.Types.LastUpdateStatus

Read LastUpdateStatusReasonCode 
Instance details

Defined in Amazonka.Lambda.Types.LastUpdateStatusReasonCode

Read Layer 
Instance details

Defined in Amazonka.Lambda.Types.Layer

Read LayerVersionContentOutput 
Instance details

Defined in Amazonka.Lambda.Types.LayerVersionContentOutput

Read LayerVersionsListItem 
Instance details

Defined in Amazonka.Lambda.Types.LayerVersionsListItem

Read LayersListItem 
Instance details

Defined in Amazonka.Lambda.Types.LayersListItem

Read LogType 
Instance details

Defined in Amazonka.Lambda.Types.LogType

Read OnFailure 
Instance details

Defined in Amazonka.Lambda.Types.OnFailure

Read OnSuccess 
Instance details

Defined in Amazonka.Lambda.Types.OnSuccess

Read PackageType 
Instance details

Defined in Amazonka.Lambda.Types.PackageType

Read ProvisionedConcurrencyConfigListItem 
Instance details

Defined in Amazonka.Lambda.Types.ProvisionedConcurrencyConfigListItem

Read ProvisionedConcurrencyStatusEnum 
Instance details

Defined in Amazonka.Lambda.Types.ProvisionedConcurrencyStatusEnum

Read Runtime 
Instance details

Defined in Amazonka.Lambda.Types.Runtime

Read SelfManagedEventSource 
Instance details

Defined in Amazonka.Lambda.Types.SelfManagedEventSource

Read SelfManagedKafkaEventSourceConfig 
Instance details

Defined in Amazonka.Lambda.Types.SelfManagedKafkaEventSourceConfig

Read SnapStart 
Instance details

Defined in Amazonka.Lambda.Types.SnapStart

Read SnapStartApplyOn 
Instance details

Defined in Amazonka.Lambda.Types.SnapStartApplyOn

Read SnapStartOptimizationStatus 
Instance details

Defined in Amazonka.Lambda.Types.SnapStartOptimizationStatus

Read SnapStartResponse 
Instance details

Defined in Amazonka.Lambda.Types.SnapStartResponse

Read SourceAccessConfiguration 
Instance details

Defined in Amazonka.Lambda.Types.SourceAccessConfiguration

Read SourceAccessType 
Instance details

Defined in Amazonka.Lambda.Types.SourceAccessType

Read State 
Instance details

Defined in Amazonka.Lambda.Types.State

Read StateReasonCode 
Instance details

Defined in Amazonka.Lambda.Types.StateReasonCode

Read TracingConfig 
Instance details

Defined in Amazonka.Lambda.Types.TracingConfig

Read TracingConfigResponse 
Instance details

Defined in Amazonka.Lambda.Types.TracingConfigResponse

Read TracingMode 
Instance details

Defined in Amazonka.Lambda.Types.TracingMode

Read VpcConfig 
Instance details

Defined in Amazonka.Lambda.Types.VpcConfig

Read VpcConfigResponse 
Instance details

Defined in Amazonka.Lambda.Types.VpcConfigResponse

Read ListAccountRolesResponse 
Instance details

Defined in Amazonka.SSO.ListAccountRoles

Read ListAccountsResponse 
Instance details

Defined in Amazonka.SSO.ListAccounts

Read LogoutResponse 
Instance details

Defined in Amazonka.SSO.Logout

Read AccountInfo 
Instance details

Defined in Amazonka.SSO.Types.AccountInfo

Read RoleInfo 
Instance details

Defined in Amazonka.SSO.Types.RoleInfo

Read AssumeRole 
Instance details

Defined in Amazonka.STS.AssumeRole

Read AssumeRoleWithSAML 
Instance details

Defined in Amazonka.STS.AssumeRoleWithSAML

Read AssumeRoleWithWebIdentity 
Instance details

Defined in Amazonka.STS.AssumeRoleWithWebIdentity

Read DecodeAuthorizationMessage 
Instance details

Defined in Amazonka.STS.DecodeAuthorizationMessage

Read DecodeAuthorizationMessageResponse 
Instance details

Defined in Amazonka.STS.DecodeAuthorizationMessage

Read GetAccessKeyInfo 
Instance details

Defined in Amazonka.STS.GetAccessKeyInfo

Read GetAccessKeyInfoResponse 
Instance details

Defined in Amazonka.STS.GetAccessKeyInfo

Read GetCallerIdentity 
Instance details

Defined in Amazonka.STS.GetCallerIdentity

Read GetCallerIdentityResponse 
Instance details

Defined in Amazonka.STS.GetCallerIdentity

Read GetFederationToken 
Instance details

Defined in Amazonka.STS.GetFederationToken

Read GetSessionToken 
Instance details

Defined in Amazonka.STS.GetSessionToken

Read AssumedRoleUser 
Instance details

Defined in Amazonka.STS.Types.AssumedRoleUser

Read FederatedUser 
Instance details

Defined in Amazonka.STS.Types.FederatedUser

Read PolicyDescriptorType 
Instance details

Defined in Amazonka.STS.Types.PolicyDescriptorType

Read Tag 
Instance details

Defined in Amazonka.STS.Types.Tag

Read All

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Read Any

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Read Version

Since: base-2.1

Instance details

Defined in Data.Version

Read Void

Reading a Void value is always a parse error, considering Void as a data type with no constructors.

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Read CBool 
Instance details

Defined in Foreign.C.Types

Read CChar 
Instance details

Defined in Foreign.C.Types

Read CClock 
Instance details

Defined in Foreign.C.Types

Read CDouble 
Instance details

Defined in Foreign.C.Types

Read CFloat 
Instance details

Defined in Foreign.C.Types

Read CInt 
Instance details

Defined in Foreign.C.Types

Read CIntMax 
Instance details

Defined in Foreign.C.Types

Read CIntPtr 
Instance details

Defined in Foreign.C.Types

Read CLLong 
Instance details

Defined in Foreign.C.Types

Read CLong 
Instance details

Defined in Foreign.C.Types

Read CPtrdiff 
Instance details

Defined in Foreign.C.Types

Read CSChar 
Instance details

Defined in Foreign.C.Types

Read CSUSeconds 
Instance details

Defined in Foreign.C.Types

Read CShort 
Instance details

Defined in Foreign.C.Types

Read CSigAtomic 
Instance details

Defined in Foreign.C.Types

Read CSize 
Instance details

Defined in Foreign.C.Types

Read CTime 
Instance details

Defined in Foreign.C.Types

Read CUChar 
Instance details

Defined in Foreign.C.Types

Read CUInt 
Instance details

Defined in Foreign.C.Types

Read CUIntMax 
Instance details

Defined in Foreign.C.Types

Read CUIntPtr 
Instance details

Defined in Foreign.C.Types

Read CULLong 
Instance details

Defined in Foreign.C.Types

Read CULong 
Instance details

Defined in Foreign.C.Types

Read CUSeconds 
Instance details

Defined in Foreign.C.Types

Read CUShort 
Instance details

Defined in Foreign.C.Types

Read CWchar 
Instance details

Defined in Foreign.C.Types

Read Associativity

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Read DecidedStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Read Fixity

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Read SourceStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Read SourceUnpackedness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Read SeekMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Device

Read ExitCode 
Instance details

Defined in GHC.IO.Exception

Read BufferMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Handle.Types

Read Newline

Since: base-4.3.0.0

Instance details

Defined in GHC.IO.Handle.Types

Read NewlineMode

Since: base-4.3.0.0

Instance details

Defined in GHC.IO.Handle.Types

Read IOMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.IOMode

Read Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Read Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Read Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Read Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Read GCDetails

Since: base-4.10.0.0

Instance details

Defined in GHC.Stats

Read RTSStats

Since: base-4.10.0.0

Instance details

Defined in GHC.Stats

Read SomeChar 
Instance details

Defined in GHC.TypeLits

Read SomeSymbol

Since: base-4.7.0.0

Instance details

Defined in GHC.TypeLits

Read SomeNat

Since: base-4.7.0.0

Instance details

Defined in GHC.TypeNats

Read GeneralCategory

Since: base-2.1

Instance details

Defined in GHC.Read

Read Word16

Since: base-2.1

Instance details

Defined in GHC.Read

Read Word32

Since: base-2.1

Instance details

Defined in GHC.Read

Read Word64

Since: base-2.1

Instance details

Defined in GHC.Read

Read Word8

Since: base-2.1

Instance details

Defined in GHC.Read

Read CBlkCnt 
Instance details

Defined in System.Posix.Types

Read CBlkSize 
Instance details

Defined in System.Posix.Types

Read CCc 
Instance details

Defined in System.Posix.Types

Read CClockId 
Instance details

Defined in System.Posix.Types

Read CDev 
Instance details

Defined in System.Posix.Types

Read CFsBlkCnt 
Instance details

Defined in System.Posix.Types

Read CFsFilCnt 
Instance details

Defined in System.Posix.Types

Read CGid 
Instance details

Defined in System.Posix.Types

Read CId 
Instance details

Defined in System.Posix.Types

Read CIno 
Instance details

Defined in System.Posix.Types

Read CKey 
Instance details

Defined in System.Posix.Types

Read CMode 
Instance details

Defined in System.Posix.Types

Read CNfds 
Instance details

Defined in System.Posix.Types

Read CNlink 
Instance details

Defined in System.Posix.Types

Read COff 
Instance details

Defined in System.Posix.Types

Read CPid 
Instance details

Defined in System.Posix.Types

Read CRLim 
Instance details

Defined in System.Posix.Types

Read CSocklen 
Instance details

Defined in System.Posix.Types

Read CSpeed 
Instance details

Defined in System.Posix.Types

Read CSsize 
Instance details

Defined in System.Posix.Types

Read CTcflag 
Instance details

Defined in System.Posix.Types

Read CUid 
Instance details

Defined in System.Posix.Types

Read Fd 
Instance details

Defined in System.Posix.Types

Read Lexeme

Since: base-2.1

Instance details

Defined in GHC.Read

Read ByteString 
Instance details

Defined in Data.ByteString.Internal

Read ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Read ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Read IntSet 
Instance details

Defined in Data.IntSet.Internal

Read Ordering

Since: base-2.1

Instance details

Defined in GHC.Read

Read Cookie 
Instance details

Defined in Network.HTTP.Client.Types

Read CookieJar 
Instance details

Defined in Network.HTTP.Client.Types

Read Proxy 
Instance details

Defined in Network.HTTP.Client.Types

Read ProxySecureMode 
Instance details

Defined in Network.HTTP.Client.Types

Read StdMethod 
Instance details

Defined in Network.HTTP.Types.Method

Read IP 
Instance details

Defined in Data.IP.Addr

Read IPv4 
Instance details

Defined in Data.IP.Addr

Read IPv6 
Instance details

Defined in Data.IP.Addr

Read IPRange 
Instance details

Defined in Data.IP.Range

Read LogLevel 
Instance details

Defined in Control.Monad.Logger

Read AddrInfoFlag 
Instance details

Defined in Network.Socket.Info

Read NameInfoFlag 
Instance details

Defined in Network.Socket.Info

Read RetryAction 
Instance details

Defined in Control.Retry

Read RetryStatus 
Instance details

Defined in Control.Retry

Read LogLevel 
Instance details

Defined in RIO.Prelude.Logger

Read Scientific

Supports the skipping of parentheses and whitespaces. Example:

> read " ( ((  -1.0e+3 ) ))" :: Scientific
-1000.0

(Note: This Read instance makes internal use of scientificP to parse the floating-point number.)

Instance details

Defined in Data.Scientific

Read ShortText 
Instance details

Defined in Data.Text.Short.Internal

Read DatatypeVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Read DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Read UUID 
Instance details

Defined in Data.UUID.Types.Internal

Read UnpackedUUID 
Instance details

Defined in Data.UUID.Types.Internal

Read DictionaryHash 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

readsPrec :: Int -> ReadS DictionaryHash #

readList :: ReadS [DictionaryHash] #

readPrec :: ReadPrec DictionaryHash #

readListPrec :: ReadPrec [DictionaryHash] #

Read Integer

Since: base-2.1

Instance details

Defined in GHC.Read

Read Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Read

Read ()

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS () #

readList :: ReadS [()] #

readPrec :: ReadPrec () #

readListPrec :: ReadPrec [()] #

Read Bool

Since: base-2.1

Instance details

Defined in GHC.Read

Read Char

Since: base-2.1

Instance details

Defined in GHC.Read

Read Double

Since: base-2.1

Instance details

Defined in GHC.Read

Read Float

Since: base-2.1

Instance details

Defined in GHC.Read

Read Int

Since: base-2.1

Instance details

Defined in GHC.Read

Read Word

Since: base-4.5.0.0

Instance details

Defined in GHC.Read

Read a => Read (Fixed a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Read a => Read (Large a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Read a => Read (Negative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Read a => Read (NonEmptyList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Read a => Read (NonNegative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Read a => Read (NonPositive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Read a => Read (NonZero a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Read a => Read (OrderedList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Read a => Read (Positive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Read a => Read (Shrink2 a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Read a => Read (Small a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Read a => Read (SortedList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Read v => Read (KeyMap v) 
Instance details

Defined in Data.Aeson.KeyMap

Read (Time a) 
Instance details

Defined in Amazonka.Data.Time

Read a => Read (ZipList a)

Since: base-4.7.0.0

Instance details

Defined in Control.Applicative

Read a => Read (Complex a)

Since: base-2.1

Instance details

Defined in Data.Complex

Read a => Read (Identity a)

This instance would be equivalent to the derived instances of the Identity newtype if the runIdentity field were removed

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Read a => Read (First a)

Since: base-2.1

Instance details

Defined in Data.Monoid

Read a => Read (Last a)

Since: base-2.1

Instance details

Defined in Data.Monoid

Read a => Read (Down a)

This instance would be equivalent to the derived instances of the Down newtype if the getDown field were removed

Since: base-4.7.0.0

Instance details

Defined in Data.Ord

Read a => Read (First a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Read a => Read (Last a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Read a => Read (Max a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Read a => Read (Min a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Read m => Read (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Read a => Read (Dual a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Read a => Read (Product a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Read a => Read (Sum a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Read p => Read (Par1 p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

(Integral a, Read a) => Read (Ratio a)

Since: base-2.1

Instance details

Defined in GHC.Read

Read vertex => Read (SCC vertex)

Since: containers-0.5.9

Instance details

Defined in Data.Graph

Methods

readsPrec :: Int -> ReadS (SCC vertex) #

readList :: ReadS [SCC vertex] #

readPrec :: ReadPrec (SCC vertex) #

readListPrec :: ReadPrec [SCC vertex] #

Read e => Read (IntMap e) 
Instance details

Defined in Data.IntMap.Internal

Read a => Read (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Read a => Read (ViewL a) 
Instance details

Defined in Data.Sequence.Internal

Read a => Read (ViewR a) 
Instance details

Defined in Data.Sequence.Internal

(Read a, Ord a) => Read (Set a) 
Instance details

Defined in Data.Set.Internal

Read a => Read (Tree a) 
Instance details

Defined in Data.Tree

HashAlgorithm a => Read (Digest a) 
Instance details

Defined in Crypto.Hash.Types

Read1 f => Read (Fix f) 
Instance details

Defined in Data.Fix

(Functor f, Read1 f) => Read (Mu f) 
Instance details

Defined in Data.Fix

(Functor f, Read1 f) => Read (Nu f) 
Instance details

Defined in Data.Fix

Read a => Read (DNonEmpty a) 
Instance details

Defined in Data.DList.DNonEmpty.Internal

Read a => Read (DList a) 
Instance details

Defined in Data.DList.Internal

Read (AddrRange IPv4) 
Instance details

Defined in Data.IP.Range

Read (AddrRange IPv6) 
Instance details

Defined in Data.IP.Range

Read mono => Read (NonNull mono) 
Instance details

Defined in Data.NonNull

Read a => Read (Array a) 
Instance details

Defined in Data.Primitive.Array

Read a => Read (SmallArray a) 
Instance details

Defined in Data.Primitive.SmallArray

Read a => Read (Maybe a) 
Instance details

Defined in Data.Strict.Maybe

(Eq a, Hashable a, Read a) => Read (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Read a => Read (Vector a) 
Instance details

Defined in Data.Vector

(Read a, Prim a) => Read (Vector a) 
Instance details

Defined in Data.Vector.Primitive

(Read a, Storable a) => Read (Vector a) 
Instance details

Defined in Data.Vector.Storable

Read a => Read (NonEmpty a)

Since: base-4.11.0.0

Instance details

Defined in GHC.Read

Read a => Read (Maybe a)

Since: base-2.1

Instance details

Defined in GHC.Read

Read a => Read (a)

Since: base-4.15

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a) #

readList :: ReadS [(a)] #

readPrec :: ReadPrec (a) #

readListPrec :: ReadPrec [(a)] #

Read a => Read [a]

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS [a] #

readList :: ReadS [[a]] #

readPrec :: ReadPrec [a] #

readListPrec :: ReadPrec [[a]] #

(Read a, Read b) => Read (Either a b)

Since: base-3.0

Instance details

Defined in Data.Either

Read (Proxy t)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

(Read a, Read b) => Read (Arg a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

readsPrec :: Int -> ReadS (Arg a b) #

readList :: ReadS [Arg a b] #

readPrec :: ReadPrec (Arg a b) #

readListPrec :: ReadPrec [Arg a b] #

(Ix a, Read a, Read b) => Read (Array a b)

Since: base-2.1

Instance details

Defined in GHC.Read

Read (U1 p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Read (V1 p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

(Ord k, Read k, Read e) => Read (Map k e) 
Instance details

Defined in Data.Map.Internal

Methods

readsPrec :: Int -> ReadS (Map k e) #

readList :: ReadS [Map k e] #

readPrec :: ReadPrec (Map k e) #

readListPrec :: ReadPrec [Map k e] #

(Read1 f, Read a) => Read (Cofree f a) 
Instance details

Defined in Control.Comonad.Cofree

(Read1 f, Read a) => Read (Free f a) 
Instance details

Defined in Control.Monad.Free

Methods

readsPrec :: Int -> ReadS (Free f a) #

readList :: ReadS [Free f a] #

readPrec :: ReadPrec (Free f a) #

readListPrec :: ReadPrec [Free f a] #

(Functor f, Read (f a)) => Read (Yoneda f a) 
Instance details

Defined in Data.Functor.Yoneda

(Read a, Read b) => Read (Either a b) 
Instance details

Defined in Data.Strict.Either

(Read a, Read b) => Read (These a b) 
Instance details

Defined in Data.Strict.These

(Read a, Read b) => Read (Pair a b) 
Instance details

Defined in Data.Strict.Tuple

Methods

readsPrec :: Int -> ReadS (Pair a b) #

readList :: ReadS [Pair a b] #

readPrec :: ReadPrec (Pair a b) #

readListPrec :: ReadPrec [Pair a b] #

(Read a, Read b) => Read (These a b) 
Instance details

Defined in Data.These

(Read1 f, Read a) => Read (Lift f a) 
Instance details

Defined in Control.Applicative.Lift

Methods

readsPrec :: Int -> ReadS (Lift f a) #

readList :: ReadS [Lift f a] #

readPrec :: ReadPrec (Lift f a) #

readListPrec :: ReadPrec [Lift f a] #

(Read1 m, Read a) => Read (ListT m a) 
Instance details

Defined in Control.Monad.Trans.List

(Read1 m, Read a) => Read (MaybeT m a) 
Instance details

Defined in Control.Monad.Trans.Maybe

(Eq k, Hashable k, Read k, Read e) => Read (HashMap k e) 
Instance details

Defined in Data.HashMap.Internal

(Read a, Read b) => Read (a, b)

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a, b) #

readList :: ReadS [(a, b)] #

readPrec :: ReadPrec (a, b) #

readListPrec :: ReadPrec [(a, b)] #

Read a => Read (Const a b)

This instance would be equivalent to the derived instances of the Const newtype if the getConst field were removed

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Const

Read (f a) => Read (Ap f a)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

readsPrec :: Int -> ReadS (Ap f a) #

readList :: ReadS [Ap f a] #

readPrec :: ReadPrec (Ap f a) #

readListPrec :: ReadPrec [Ap f a] #

Read (f a) => Read (Alt f a)

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

readsPrec :: Int -> ReadS (Alt f a) #

readList :: ReadS [Alt f a] #

readPrec :: ReadPrec (Alt f a) #

readListPrec :: ReadPrec [Alt f a] #

a ~ b => Read (a :~: b)

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Equality

Methods

readsPrec :: Int -> ReadS (a :~: b) #

readList :: ReadS [a :~: b] #

readPrec :: ReadPrec (a :~: b) #

readListPrec :: ReadPrec [a :~: b] #

Read (f p) => Read (Rec1 f p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

readsPrec :: Int -> ReadS (Rec1 f p) #

readList :: ReadS [Rec1 f p] #

readPrec :: ReadPrec (Rec1 f p) #

readListPrec :: ReadPrec [Rec1 f p] #

Read (p (Fix p a) a) => Read (Fix p a) 
Instance details

Defined in Data.Bifunctor.Fix

Methods

readsPrec :: Int -> ReadS (Fix p a) #

readList :: ReadS [Fix p a] #

readPrec :: ReadPrec (Fix p a) #

readListPrec :: ReadPrec [Fix p a] #

Read (p a a) => Read (Join p a) 
Instance details

Defined in Data.Bifunctor.Join

Methods

readsPrec :: Int -> ReadS (Join p a) #

readList :: ReadS [Join p a] #

readPrec :: ReadPrec (Join p a) #

readListPrec :: ReadPrec [Join p a] #

(Read a, Read (f b)) => Read (CofreeF f a b) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

readsPrec :: Int -> ReadS (CofreeF f a b) #

readList :: ReadS [CofreeF f a b] #

readPrec :: ReadPrec (CofreeF f a b) #

readListPrec :: ReadPrec [CofreeF f a b] #

Read (w (CofreeF f a (CofreeT f w a))) => Read (CofreeT f w a) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

readsPrec :: Int -> ReadS (CofreeT f w a) #

readList :: ReadS [CofreeT f w a] #

readPrec :: ReadPrec (CofreeT f w a) #

readListPrec :: ReadPrec [CofreeT f w a] #

(Read a, Read (f b)) => Read (FreeF f a b) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

readsPrec :: Int -> ReadS (FreeF f a b) #

readList :: ReadS [FreeF f a b] #

readPrec :: ReadPrec (FreeF f a b) #

readListPrec :: ReadPrec [FreeF f a b] #

(Read1 f, Read1 m, Read a) => Read (FreeT f m a) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

readsPrec :: Int -> ReadS (FreeT f m a) #

readList :: ReadS [FreeT f m a] #

readPrec :: ReadPrec (FreeT f m a) #

readListPrec :: ReadPrec [FreeT f m a] #

Read b => Read (Tagged s b) 
Instance details

Defined in Data.Tagged

(Read (f a), Read (g a), Read a) => Read (These1 f g a) 
Instance details

Defined in Data.Functor.These

Methods

readsPrec :: Int -> ReadS (These1 f g a) #

readList :: ReadS [These1 f g a] #

readPrec :: ReadPrec (These1 f g a) #

readListPrec :: ReadPrec [These1 f g a] #

(Read1 f, Read a) => Read (Backwards f a) 
Instance details

Defined in Control.Applicative.Backwards

(Read e, Read1 m, Read a) => Read (ErrorT e m a) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

readsPrec :: Int -> ReadS (ErrorT e m a) #

readList :: ReadS [ErrorT e m a] #

readPrec :: ReadPrec (ErrorT e m a) #

readListPrec :: ReadPrec [ErrorT e m a] #

(Read e, Read1 m, Read a) => Read (ExceptT e m a) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

readsPrec :: Int -> ReadS (ExceptT e m a) #

readList :: ReadS [ExceptT e m a] #

readPrec :: ReadPrec (ExceptT e m a) #

readListPrec :: ReadPrec [ExceptT e m a] #

(Read1 f, Read a) => Read (IdentityT f a) 
Instance details

Defined in Control.Monad.Trans.Identity

(Read w, Read1 m, Read a) => Read (WriterT w m a) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

readsPrec :: Int -> ReadS (WriterT w m a) #

readList :: ReadS [WriterT w m a] #

readPrec :: ReadPrec (WriterT w m a) #

readListPrec :: ReadPrec [WriterT w m a] #

(Read w, Read1 m, Read a) => Read (WriterT w m a) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

readsPrec :: Int -> ReadS (WriterT w m a) #

readList :: ReadS [WriterT w m a] #

readPrec :: ReadPrec (WriterT w m a) #

readListPrec :: ReadPrec [WriterT w m a] #

Read a => Read (Constant a b) 
Instance details

Defined in Data.Functor.Constant

(Read1 f, Read a) => Read (Reverse f a) 
Instance details

Defined in Data.Functor.Reverse

(Read a, Read b, Read c) => Read (a, b, c)

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a, b, c) #

readList :: ReadS [(a, b, c)] #

readPrec :: ReadPrec (a, b, c) #

readListPrec :: ReadPrec [(a, b, c)] #

(Read1 f, Read1 g, Read a) => Read (Product f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Product

Methods

readsPrec :: Int -> ReadS (Product f g a) #

readList :: ReadS [Product f g a] #

readPrec :: ReadPrec (Product f g a) #

readListPrec :: ReadPrec [Product f g a] #

(Read1 f, Read1 g, Read a) => Read (Sum f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Sum

Methods

readsPrec :: Int -> ReadS (Sum f g a) #

readList :: ReadS [Sum f g a] #

readPrec :: ReadPrec (Sum f g a) #

readListPrec :: ReadPrec [Sum f g a] #

a ~~ b => Read (a :~~: b)

Since: base-4.10.0.0

Instance details

Defined in Data.Type.Equality

Methods

readsPrec :: Int -> ReadS (a :~~: b) #

readList :: ReadS [a :~~: b] #

readPrec :: ReadPrec (a :~~: b) #

readListPrec :: ReadPrec [a :~~: b] #

(Read (f p), Read (g p)) => Read ((f :*: g) p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

readsPrec :: Int -> ReadS ((f :*: g) p) #

readList :: ReadS [(f :*: g) p] #

readPrec :: ReadPrec ((f :*: g) p) #

readListPrec :: ReadPrec [(f :*: g) p] #

(Read (f p), Read (g p)) => Read ((f :+: g) p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

readsPrec :: Int -> ReadS ((f :+: g) p) #

readList :: ReadS [(f :+: g) p] #

readPrec :: ReadPrec ((f :+: g) p) #

readListPrec :: ReadPrec [(f :+: g) p] #

Read c => Read (K1 i c p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

readsPrec :: Int -> ReadS (K1 i c p) #

readList :: ReadS [K1 i c p] #

readPrec :: ReadPrec (K1 i c p) #

readListPrec :: ReadPrec [K1 i c p] #

(Read a, Read b, Read c, Read d) => Read (a, b, c, d)

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d) #

readList :: ReadS [(a, b, c, d)] #

readPrec :: ReadPrec (a, b, c, d) #

readListPrec :: ReadPrec [(a, b, c, d)] #

(Read1 f, Read1 g, Read a) => Read (Compose f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

readsPrec :: Int -> ReadS (Compose f g a) #

readList :: ReadS [Compose f g a] #

readPrec :: ReadPrec (Compose f g a) #

readListPrec :: ReadPrec [Compose f g a] #

Read (f (g p)) => Read ((f :.: g) p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

readsPrec :: Int -> ReadS ((f :.: g) p) #

readList :: ReadS [(f :.: g) p] #

readPrec :: ReadPrec ((f :.: g) p) #

readListPrec :: ReadPrec [(f :.: g) p] #

Read (f p) => Read (M1 i c f p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

readsPrec :: Int -> ReadS (M1 i c f p) #

readList :: ReadS [M1 i c f p] #

readPrec :: ReadPrec (M1 i c f p) #

readListPrec :: ReadPrec [M1 i c f p] #

Read (f a) => Read (Clown f a b) 
Instance details

Defined in Data.Bifunctor.Clown

Methods

readsPrec :: Int -> ReadS (Clown f a b) #

readList :: ReadS [Clown f a b] #

readPrec :: ReadPrec (Clown f a b) #

readListPrec :: ReadPrec [Clown f a b] #

Read (p b a) => Read (Flip p a b) 
Instance details

Defined in Data.Bifunctor.Flip

Methods

readsPrec :: Int -> ReadS (Flip p a b) #

readList :: ReadS [Flip p a b] #

readPrec :: ReadPrec (Flip p a b) #

readListPrec :: ReadPrec [Flip p a b] #

Read (g b) => Read (Joker g a b) 
Instance details

Defined in Data.Bifunctor.Joker

Methods

readsPrec :: Int -> ReadS (Joker g a b) #

readList :: ReadS [Joker g a b] #

readPrec :: ReadPrec (Joker g a b) #

readListPrec :: ReadPrec [Joker g a b] #

Read (p a b) => Read (WrappedBifunctor p a b) 
Instance details

Defined in Data.Bifunctor.Wrapped

(Read a, Read b, Read c, Read d, Read e) => Read (a, b, c, d, e)

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d, e) #

readList :: ReadS [(a, b, c, d, e)] #

readPrec :: ReadPrec (a, b, c, d, e) #

readListPrec :: ReadPrec [(a, b, c, d, e)] #

(Read (f a b), Read (g a b)) => Read (Product f g a b) 
Instance details

Defined in Data.Bifunctor.Product

Methods

readsPrec :: Int -> ReadS (Product f g a b) #

readList :: ReadS [Product f g a b] #

readPrec :: ReadPrec (Product f g a b) #

readListPrec :: ReadPrec [Product f g a b] #

(Read (p a b), Read (q a b)) => Read (Sum p q a b) 
Instance details

Defined in Data.Bifunctor.Sum

Methods

readsPrec :: Int -> ReadS (Sum p q a b) #

readList :: ReadS [Sum p q a b] #

readPrec :: ReadPrec (Sum p q a b) #

readListPrec :: ReadPrec [Sum p q a b] #

(Read a, Read b, Read c, Read d, Read e, Read f) => Read (a, b, c, d, e, f)

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d, e, f) #

readList :: ReadS [(a, b, c, d, e, f)] #

readPrec :: ReadPrec (a, b, c, d, e, f) #

readListPrec :: ReadPrec [(a, b, c, d, e, f)] #

Read (f (p a b)) => Read (Tannen f p a b) 
Instance details

Defined in Data.Bifunctor.Tannen

Methods

readsPrec :: Int -> ReadS (Tannen f p a b) #

readList :: ReadS [Tannen f p a b] #

readPrec :: ReadPrec (Tannen f p a b) #

readListPrec :: ReadPrec [Tannen f p a b] #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g) => Read (a, b, c, d, e, f, g)

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d, e, f, g) #

readList :: ReadS [(a, b, c, d, e, f, g)] #

readPrec :: ReadPrec (a, b, c, d, e, f, g) #

readListPrec :: ReadPrec [(a, b, c, d, e, f, g)] #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h) => Read (a, b, c, d, e, f, g, h)

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d, e, f, g, h) #

readList :: ReadS [(a, b, c, d, e, f, g, h)] #

readPrec :: ReadPrec (a, b, c, d, e, f, g, h) #

readListPrec :: ReadPrec [(a, b, c, d, e, f, g, h)] #

Read (p (f a) (g b)) => Read (Biff p f g a b) 
Instance details

Defined in Data.Bifunctor.Biff

Methods

readsPrec :: Int -> ReadS (Biff p f g a b) #

readList :: ReadS [Biff p f g a b] #

readPrec :: ReadPrec (Biff p f g a b) #

readListPrec :: ReadPrec [Biff p f g a b] #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i) => Read (a, b, c, d, e, f, g, h, i)

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d, e, f, g, h, i) #

readList :: ReadS [(a, b, c, d, e, f, g, h, i)] #

readPrec :: ReadPrec (a, b, c, d, e, f, g, h, i) #

readListPrec :: ReadPrec [(a, b, c, d, e, f, g, h, i)] #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j) => Read (a, b, c, d, e, f, g, h, i, j)

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d, e, f, g, h, i, j) #

readList :: ReadS [(a, b, c, d, e, f, g, h, i, j)] #

readPrec :: ReadPrec (a, b, c, d, e, f, g, h, i, j) #

readListPrec :: ReadPrec [(a, b, c, d, e, f, g, h, i, j)] #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j, Read k) => Read (a, b, c, d, e, f, g, h, i, j, k)

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d, e, f, g, h, i, j, k) #

readList :: ReadS [(a, b, c, d, e, f, g, h, i, j, k)] #

readPrec :: ReadPrec (a, b, c, d, e, f, g, h, i, j, k) #

readListPrec :: ReadPrec [(a, b, c, d, e, f, g, h, i, j, k)] #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j, Read k, Read l) => Read (a, b, c, d, e, f, g, h, i, j, k, l)

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d, e, f, g, h, i, j, k, l) #

readList :: ReadS [(a, b, c, d, e, f, g, h, i, j, k, l)] #

readPrec :: ReadPrec (a, b, c, d, e, f, g, h, i, j, k, l) #

readListPrec :: ReadPrec [(a, b, c, d, e, f, g, h, i, j, k, l)] #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j, Read k, Read l, Read m) => Read (a, b, c, d, e, f, g, h, i, j, k, l, m)

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d, e, f, g, h, i, j, k, l, m) #

readList :: ReadS [(a, b, c, d, e, f, g, h, i, j, k, l, m)] #

readPrec :: ReadPrec (a, b, c, d, e, f, g, h, i, j, k, l, m) #

readListPrec :: ReadPrec [(a, b, c, d, e, f, g, h, i, j, k, l, m)] #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j, Read k, Read l, Read m, Read n) => Read (a, b, c, d, e, f, g, h, i, j, k, l, m, n)

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d, e, f, g, h, i, j, k, l, m, n) #

readList :: ReadS [(a, b, c, d, e, f, g, h, i, j, k, l, m, n)] #

readPrec :: ReadPrec (a, b, c, d, e, f, g, h, i, j, k, l, m, n) #

readListPrec :: ReadPrec [(a, b, c, d, e, f, g, h, i, j, k, l, m, n)] #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j, Read k, Read l, Read m, Read n, Read o) => Read (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) #

readList :: ReadS [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)] #

readPrec :: ReadPrec (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) #

readListPrec :: ReadPrec [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)] #

class (Num a, Ord a) => Real a where #

Methods

toRational :: a -> Rational #

the rational equivalent of its real argument with full precision

Instances

Instances details
Real ChunkSize 
Instance details

Defined in Amazonka.Data.Body

Real Seconds 
Instance details

Defined in Amazonka.Types

Real CBool 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CBool -> Rational #

Real CChar 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CChar -> Rational #

Real CClock 
Instance details

Defined in Foreign.C.Types

Real CDouble 
Instance details

Defined in Foreign.C.Types

Real CFloat 
Instance details

Defined in Foreign.C.Types

Real CInt 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CInt -> Rational #

Real CIntMax 
Instance details

Defined in Foreign.C.Types

Real CIntPtr 
Instance details

Defined in Foreign.C.Types

Real CLLong 
Instance details

Defined in Foreign.C.Types

Real CLong 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CLong -> Rational #

Real CPtrdiff 
Instance details

Defined in Foreign.C.Types

Real CSChar 
Instance details

Defined in Foreign.C.Types

Real CSUSeconds 
Instance details

Defined in Foreign.C.Types

Real CShort 
Instance details

Defined in Foreign.C.Types

Real CSigAtomic 
Instance details

Defined in Foreign.C.Types

Real CSize 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CSize -> Rational #

Real CTime 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CTime -> Rational #

Real CUChar 
Instance details

Defined in Foreign.C.Types

Real CUInt 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CUInt -> Rational #

Real CUIntMax 
Instance details

Defined in Foreign.C.Types

Real CUIntPtr 
Instance details

Defined in Foreign.C.Types

Real CULLong 
Instance details

Defined in Foreign.C.Types

Real CULong 
Instance details

Defined in Foreign.C.Types

Real CUSeconds 
Instance details

Defined in Foreign.C.Types

Real CUShort 
Instance details

Defined in Foreign.C.Types

Real CWchar 
Instance details

Defined in Foreign.C.Types

Real Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

toRational :: Int16 -> Rational #

Real Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

toRational :: Int32 -> Rational #

Real Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

toRational :: Int64 -> Rational #

Real Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

toRational :: Int8 -> Rational #

Real Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Real Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Real Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Real Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Methods

toRational :: Word8 -> Rational #

Real CBlkCnt 
Instance details

Defined in System.Posix.Types

Real CBlkSize 
Instance details

Defined in System.Posix.Types

Real CCc 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CCc -> Rational #

Real CClockId 
Instance details

Defined in System.Posix.Types

Real CDev 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CDev -> Rational #

Real CFsBlkCnt 
Instance details

Defined in System.Posix.Types

Real CFsFilCnt 
Instance details

Defined in System.Posix.Types

Real CGid 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CGid -> Rational #

Real CId 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CId -> Rational #

Real CIno 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CIno -> Rational #

Real CKey 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CKey -> Rational #

Real CMode 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CMode -> Rational #

Real CNfds 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CNfds -> Rational #

Real CNlink 
Instance details

Defined in System.Posix.Types

Real COff 
Instance details

Defined in System.Posix.Types

Methods

toRational :: COff -> Rational #

Real CPid 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CPid -> Rational #

Real CRLim 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CRLim -> Rational #

Real CSocklen 
Instance details

Defined in System.Posix.Types

Real CSpeed 
Instance details

Defined in System.Posix.Types

Real CSsize 
Instance details

Defined in System.Posix.Types

Real CTcflag 
Instance details

Defined in System.Posix.Types

Real CUid 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CUid -> Rational #

Real Fd 
Instance details

Defined in System.Posix.Types

Methods

toRational :: Fd -> Rational #

Real Scientific

WARNING: toRational needs to compute the Integer magnitude: 10^e. If applied to a huge exponent this could fill up all space and crash your program!

Avoid applying toRational (or realToFrac) to scientific numbers coming from an untrusted source and use toRealFloat instead. The latter guards against excessive space usage.

Instance details

Defined in Data.Scientific

Real DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Real Integer

Since: base-2.0.1

Instance details

Defined in GHC.Real

Real Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Real

Real Int

Since: base-2.0.1

Instance details

Defined in GHC.Real

Methods

toRational :: Int -> Rational #

Real Word

Since: base-2.1

Instance details

Defined in GHC.Real

Methods

toRational :: Word -> Rational #

Real a => Real (Blind a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

toRational :: Blind a -> Rational #

Real a => Real (Fixed a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

toRational :: Fixed a -> Rational #

Real a => Real (Large a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

toRational :: Large a -> Rational #

Real a => Real (Shrink2 a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

toRational :: Shrink2 a -> Rational #

Real a => Real (Small a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

toRational :: Small a -> Rational #

Real a => Real (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

toRational :: Identity a -> Rational #

Real a => Real (Down a)

Since: base-4.14.0.0

Instance details

Defined in Data.Ord

Methods

toRational :: Down a -> Rational #

Integral a => Real (Ratio a)

Since: base-2.0.1

Instance details

Defined in GHC.Real

Methods

toRational :: Ratio a -> Rational #

Real a => Real (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

toRational :: Const a b -> Rational #

Real a => Real (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

toRational :: Tagged s a -> Rational #

class (RealFrac a, Floating a) => RealFloat a where #

Efficient, machine-independent access to the components of a floating-point number.

Methods

floatRadix :: a -> Integer #

a constant function, returning the radix of the representation (often 2)

floatDigits :: a -> Int #

a constant function, returning the number of digits of floatRadix in the significand

floatRange :: a -> (Int, Int) #

a constant function, returning the lowest and highest values the exponent may assume

decodeFloat :: a -> (Integer, Int) #

The function decodeFloat applied to a real floating-point number returns the significand expressed as an Integer and an appropriately scaled exponent (an Int). If decodeFloat x yields (m,n), then x is equal in value to m*b^^n, where b is the floating-point radix, and furthermore, either m and n are both zero or else b^(d-1) <= abs m < b^d, where d is the value of floatDigits x. In particular, decodeFloat 0 = (0,0). If the type contains a negative zero, also decodeFloat (-0.0) = (0,0). The result of decodeFloat x is unspecified if either of isNaN x or isInfinite x is True.

encodeFloat :: Integer -> Int -> a #

encodeFloat performs the inverse of decodeFloat in the sense that for finite x with the exception of -0.0, uncurry encodeFloat (decodeFloat x) = x. encodeFloat m n is one of the two closest representable floating-point numbers to m*b^^n (or ±Infinity if overflow occurs); usually the closer, but if m contains too many bits, the result may be rounded in the wrong direction.

exponent :: a -> Int #

exponent corresponds to the second component of decodeFloat. exponent 0 = 0 and for finite nonzero x, exponent x = snd (decodeFloat x) + floatDigits x. If x is a finite floating-point number, it is equal in value to significand x * b ^^ exponent x, where b is the floating-point radix. The behaviour is unspecified on infinite or NaN values.

significand :: a -> a #

The first component of decodeFloat, scaled to lie in the open interval (-1,1), either 0.0 or of absolute value >= 1/b, where b is the floating-point radix. The behaviour is unspecified on infinite or NaN values.

scaleFloat :: Int -> a -> a #

multiplies a floating-point number by an integer power of the radix

isNaN :: a -> Bool #

True if the argument is an IEEE "not-a-number" (NaN) value

isInfinite :: a -> Bool #

True if the argument is an IEEE infinity or negative infinity

isDenormalized :: a -> Bool #

True if the argument is too small to be represented in normalized format

isNegativeZero :: a -> Bool #

True if the argument is an IEEE negative zero

isIEEE :: a -> Bool #

True if the argument is an IEEE floating point number

atan2 :: a -> a -> a #

a version of arctangent taking two real floating-point arguments. For real floating x and y, atan2 y x computes the angle (from the positive x-axis) of the vector from the origin to the point (x,y). atan2 y x returns a value in the range [-pi, pi]. It follows the Common Lisp semantics for the origin when signed zeroes are supported. atan2 y 1, with y in a type that is RealFloat, should return the same value as atan y. A default definition of atan2 is provided, but implementors can provide a more accurate implementation.

Instances

Instances details
RealFloat CDouble 
Instance details

Defined in Foreign.C.Types

RealFloat CFloat 
Instance details

Defined in Foreign.C.Types

RealFloat Double

Since: base-2.1

Instance details

Defined in GHC.Float

RealFloat Float

Since: base-2.1

Instance details

Defined in GHC.Float

RealFloat a => RealFloat (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

RealFloat a => RealFloat (Down a)

Since: base-4.14.0.0

Instance details

Defined in Data.Ord

RealFloat a => RealFloat (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

floatRadix :: Const a b -> Integer #

floatDigits :: Const a b -> Int #

floatRange :: Const a b -> (Int, Int) #

decodeFloat :: Const a b -> (Integer, Int) #

encodeFloat :: Integer -> Int -> Const a b #

exponent :: Const a b -> Int #

significand :: Const a b -> Const a b #

scaleFloat :: Int -> Const a b -> Const a b #

isNaN :: Const a b -> Bool #

isInfinite :: Const a b -> Bool #

isDenormalized :: Const a b -> Bool #

isNegativeZero :: Const a b -> Bool #

isIEEE :: Const a b -> Bool #

atan2 :: Const a b -> Const a b -> Const a b #

RealFloat a => RealFloat (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

floatRadix :: Tagged s a -> Integer #

floatDigits :: Tagged s a -> Int #

floatRange :: Tagged s a -> (Int, Int) #

decodeFloat :: Tagged s a -> (Integer, Int) #

encodeFloat :: Integer -> Int -> Tagged s a #

exponent :: Tagged s a -> Int #

significand :: Tagged s a -> Tagged s a #

scaleFloat :: Int -> Tagged s a -> Tagged s a #

isNaN :: Tagged s a -> Bool #

isInfinite :: Tagged s a -> Bool #

isDenormalized :: Tagged s a -> Bool #

isNegativeZero :: Tagged s a -> Bool #

isIEEE :: Tagged s a -> Bool #

atan2 :: Tagged s a -> Tagged s a -> Tagged s a #

class (Real a, Fractional a) => RealFrac a where #

Extracting components of fractions.

Minimal complete definition

properFraction

Methods

properFraction :: Integral b => a -> (b, a) #

The function properFraction takes a real fractional number x and returns a pair (n,f) such that x = n+f, and:

  • n is an integral number with the same sign as x; and
  • f is a fraction with the same type and sign as x, and with absolute value less than 1.

The default definitions of the ceiling, floor, truncate and round functions are in terms of properFraction.

truncate :: Integral b => a -> b #

truncate x returns the integer nearest x between zero and x

round :: Integral b => a -> b #

round x returns the nearest integer to x; the even integer if x is equidistant between two integers

ceiling :: Integral b => a -> b #

ceiling x returns the least integer not less than x

floor :: Integral b => a -> b #

floor x returns the greatest integer not greater than x

Instances

Instances details
RealFrac CDouble 
Instance details

Defined in Foreign.C.Types

Methods

properFraction :: Integral b => CDouble -> (b, CDouble) #

truncate :: Integral b => CDouble -> b #

round :: Integral b => CDouble -> b #

ceiling :: Integral b => CDouble -> b #

floor :: Integral b => CDouble -> b #

RealFrac CFloat 
Instance details

Defined in Foreign.C.Types

Methods

properFraction :: Integral b => CFloat -> (b, CFloat) #

truncate :: Integral b => CFloat -> b #

round :: Integral b => CFloat -> b #

ceiling :: Integral b => CFloat -> b #

floor :: Integral b => CFloat -> b #

RealFrac Scientific

WARNING: the methods of the RealFrac instance need to compute the magnitude 10^e. If applied to a huge exponent this could take a long time. Even worse, when the destination type is unbounded (i.e. Integer) it could fill up all space and crash your program!

Instance details

Defined in Data.Scientific

RealFrac DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Methods

properFraction :: Integral b => DiffTime -> (b, DiffTime) #

truncate :: Integral b => DiffTime -> b #

round :: Integral b => DiffTime -> b #

ceiling :: Integral b => DiffTime -> b #

floor :: Integral b => DiffTime -> b #

RealFrac a => RealFrac (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

properFraction :: Integral b => Identity a -> (b, Identity a) #

truncate :: Integral b => Identity a -> b #

round :: Integral b => Identity a -> b #

ceiling :: Integral b => Identity a -> b #

floor :: Integral b => Identity a -> b #

RealFrac a => RealFrac (Down a)

Since: base-4.14.0.0

Instance details

Defined in Data.Ord

Methods

properFraction :: Integral b => Down a -> (b, Down a) #

truncate :: Integral b => Down a -> b #

round :: Integral b => Down a -> b #

ceiling :: Integral b => Down a -> b #

floor :: Integral b => Down a -> b #

Integral a => RealFrac (Ratio a)

Since: base-2.0.1

Instance details

Defined in GHC.Real

Methods

properFraction :: Integral b => Ratio a -> (b, Ratio a) #

truncate :: Integral b => Ratio a -> b #

round :: Integral b => Ratio a -> b #

ceiling :: Integral b => Ratio a -> b #

floor :: Integral b => Ratio a -> b #

RealFrac a => RealFrac (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

properFraction :: Integral b0 => Const a b -> (b0, Const a b) #

truncate :: Integral b0 => Const a b -> b0 #

round :: Integral b0 => Const a b -> b0 #

ceiling :: Integral b0 => Const a b -> b0 #

floor :: Integral b0 => Const a b -> b0 #

RealFrac a => RealFrac (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

properFraction :: Integral b => Tagged s a -> (b, Tagged s a) #

truncate :: Integral b => Tagged s a -> b #

round :: Integral b => Tagged s a -> b #

ceiling :: Integral b => Tagged s a -> b #

floor :: Integral b => Tagged s a -> b #

class Show a where #

Conversion of values to readable Strings.

Derived instances of Show have the following properties, which are compatible with derived instances of Read:

  • The result of show is a syntactically correct Haskell expression containing only constants, given the fixity declarations in force at the point where the type is declared. It contains only the constructor names defined in the data type, parentheses, and spaces. When labelled constructor fields are used, braces, commas, field names, and equal signs are also used.
  • If the constructor is defined to be an infix operator, then showsPrec will produce infix applications of the constructor.
  • the representation will be enclosed in parentheses if the precedence of the top-level constructor in x is less than d (associativity is ignored). Thus, if d is 0 then the result is never surrounded in parentheses; if d is 11 it is always surrounded in parentheses, unless it is an atomic expression.
  • If the constructor is defined using record syntax, then show will produce the record-syntax form, with the fields given in the same order as the original declaration.

For example, given the declarations

infixr 5 :^:
data Tree a =  Leaf a  |  Tree a :^: Tree a

the derived instance of Show is equivalent to

instance (Show a) => Show (Tree a) where

       showsPrec d (Leaf m) = showParen (d > app_prec) $
            showString "Leaf " . showsPrec (app_prec+1) m
         where app_prec = 10

       showsPrec d (u :^: v) = showParen (d > up_prec) $
            showsPrec (up_prec+1) u .
            showString " :^: "      .
            showsPrec (up_prec+1) v
         where up_prec = 5

Note that right-associativity of :^: is ignored. For example,

  • show (Leaf 1 :^: Leaf 2 :^: Leaf 3) produces the string "Leaf 1 :^: (Leaf 2 :^: Leaf 3)".

Minimal complete definition

showsPrec | show

Methods

show :: a -> String #

A specialised variant of showsPrec, using precedence context zero, and returning an ordinary String.

Instances

Instances details
Show LogLevels 
Instance details

Defined in Blammo.Logging.LogSettings.LogLevels

Show CompOptions 
Instance details

Defined in System.FilePath.Glob.Base

Show Pattern 
Instance details

Defined in System.FilePath.Glob.Base

Show Token 
Instance details

Defined in System.FilePath.Glob.Base

Methods

showsPrec :: Int -> Token -> ShowS #

show :: Token -> String #

showList :: [Token] -> ShowS #

Show TypedPattern 
Instance details

Defined in System.FilePath.Glob.Directory

Methods

showsPrec :: Int -> TypedPattern -> ShowS #

show :: TypedPattern -> String #

showList :: [TypedPattern] -> ShowS #

Show ASCIIString 
Instance details

Defined in Test.QuickCheck.Modifiers

Show PrintableString 
Instance details

Defined in Test.QuickCheck.Modifiers

Show UnicodeString 
Instance details

Defined in Test.QuickCheck.Modifiers

Show Confidence 
Instance details

Defined in Test.QuickCheck.State

Show Args 
Instance details

Defined in Test.QuickCheck.Test

Methods

showsPrec :: Int -> Args -> ShowS #

show :: Args -> String #

showList :: [Args] -> ShowS #

Show Result 
Instance details

Defined in Test.QuickCheck.Test

Show AesonException 
Instance details

Defined in Data.Aeson

Show Key 
Instance details

Defined in Data.Aeson.Key

Methods

showsPrec :: Int -> Key -> ShowS #

show :: Key -> String #

showList :: [Key] -> ShowS #

Show DotNetTime 
Instance details

Defined in Data.Aeson.Types.Internal

Show JSONPathElement 
Instance details

Defined in Data.Aeson.Types.Internal

Show Options 
Instance details

Defined in Data.Aeson.Types.Internal

Show SumEncoding 
Instance details

Defined in Data.Aeson.Types.Internal

Show Value

Since version 1.5.6.0 version object values are printed in lexicographic key order

>>> toJSON $ H.fromList [("a", True), ("z", False)]
Object (fromList [("a",Bool True),("z",Bool False)])
>>> toJSON $ H.fromList [("z", False), ("a", True)]
Object (fromList [("a",Bool True),("z",Bool False)])
Instance details

Defined in Data.Aeson.Types.Internal

Methods

showsPrec :: Int -> Value -> ShowS #

show :: Value -> String #

showList :: [Value] -> ShowS #

Show ConfigProfile 
Instance details

Defined in Amazonka.Auth.ConfigFile

Show CredentialSource 
Instance details

Defined in Amazonka.Auth.ConfigFile

Show AuthError 
Instance details

Defined in Amazonka.Auth.Exception

Show CachedAccessToken 
Instance details

Defined in Amazonka.Auth.SSO

Show Autoscaling 
Instance details

Defined in Amazonka.EC2.Metadata

Show Dynamic 
Instance details

Defined in Amazonka.EC2.Metadata

Show ElasticGpus 
Instance details

Defined in Amazonka.EC2.Metadata

Show ElasticInference 
Instance details

Defined in Amazonka.EC2.Metadata

Show Events 
Instance details

Defined in Amazonka.EC2.Metadata

Show IAM 
Instance details

Defined in Amazonka.EC2.Metadata

Methods

showsPrec :: Int -> IAM -> ShowS #

show :: IAM -> String #

showList :: [IAM] -> ShowS #

Show IdentityCredentialsEC2 
Instance details

Defined in Amazonka.EC2.Metadata

Show IdentityDocument 
Instance details

Defined in Amazonka.EC2.Metadata

Show Interface 
Instance details

Defined in Amazonka.EC2.Metadata

Show Maintenance 
Instance details

Defined in Amazonka.EC2.Metadata

Show Mapping 
Instance details

Defined in Amazonka.EC2.Metadata

Show Metadata 
Instance details

Defined in Amazonka.EC2.Metadata

Show Placement 
Instance details

Defined in Amazonka.EC2.Metadata

Show Recommendations 
Instance details

Defined in Amazonka.EC2.Metadata

Show Services 
Instance details

Defined in Amazonka.EC2.Metadata

Show Spot 
Instance details

Defined in Amazonka.EC2.Metadata

Methods

showsPrec :: Int -> Spot -> ShowS #

show :: Spot -> String #

showList :: [Spot] -> ShowS #

Show Tags 
Instance details

Defined in Amazonka.EC2.Metadata

Methods

showsPrec :: Int -> Tags -> ShowS #

show :: Tags -> String #

showList :: [Tags] -> ShowS #

Show Finality 
Instance details

Defined in Amazonka.Env.Hooks

Show LogLevel 
Instance details

Defined in Amazonka.Logger

Show ActivateType 
Instance details

Defined in Amazonka.CloudFormation.ActivateType

Show ActivateTypeResponse 
Instance details

Defined in Amazonka.CloudFormation.ActivateType

Show BatchDescribeTypeConfigurations 
Instance details

Defined in Amazonka.CloudFormation.BatchDescribeTypeConfigurations

Show BatchDescribeTypeConfigurationsResponse 
Instance details

Defined in Amazonka.CloudFormation.BatchDescribeTypeConfigurations

Show CancelUpdateStack 
Instance details

Defined in Amazonka.CloudFormation.CancelUpdateStack

Show CancelUpdateStackResponse 
Instance details

Defined in Amazonka.CloudFormation.CancelUpdateStack

Show ContinueUpdateRollback 
Instance details

Defined in Amazonka.CloudFormation.ContinueUpdateRollback

Show ContinueUpdateRollbackResponse 
Instance details

Defined in Amazonka.CloudFormation.ContinueUpdateRollback

Show CreateChangeSet 
Instance details

Defined in Amazonka.CloudFormation.CreateChangeSet

Show CreateChangeSetResponse 
Instance details

Defined in Amazonka.CloudFormation.CreateChangeSet

Show CreateStack 
Instance details

Defined in Amazonka.CloudFormation.CreateStack

Show CreateStackResponse 
Instance details

Defined in Amazonka.CloudFormation.CreateStack

Show CreateStackInstances 
Instance details

Defined in Amazonka.CloudFormation.CreateStackInstances

Show CreateStackInstancesResponse 
Instance details

Defined in Amazonka.CloudFormation.CreateStackInstances

Show CreateStackSet 
Instance details

Defined in Amazonka.CloudFormation.CreateStackSet

Show CreateStackSetResponse 
Instance details

Defined in Amazonka.CloudFormation.CreateStackSet

Show DeactivateType 
Instance details

Defined in Amazonka.CloudFormation.DeactivateType

Show DeactivateTypeResponse 
Instance details

Defined in Amazonka.CloudFormation.DeactivateType

Show DeleteChangeSet 
Instance details

Defined in Amazonka.CloudFormation.DeleteChangeSet

Show DeleteChangeSetResponse 
Instance details

Defined in Amazonka.CloudFormation.DeleteChangeSet

Show DeleteStack 
Instance details

Defined in Amazonka.CloudFormation.DeleteStack

Show DeleteStackResponse 
Instance details

Defined in Amazonka.CloudFormation.DeleteStack

Show DeleteStackInstances 
Instance details

Defined in Amazonka.CloudFormation.DeleteStackInstances

Show DeleteStackInstancesResponse 
Instance details

Defined in Amazonka.CloudFormation.DeleteStackInstances

Show DeleteStackSet 
Instance details

Defined in Amazonka.CloudFormation.DeleteStackSet

Show DeleteStackSetResponse 
Instance details

Defined in Amazonka.CloudFormation.DeleteStackSet

Show DeregisterType 
Instance details

Defined in Amazonka.CloudFormation.DeregisterType

Show DeregisterTypeResponse 
Instance details

Defined in Amazonka.CloudFormation.DeregisterType

Show DescribeAccountLimits 
Instance details

Defined in Amazonka.CloudFormation.DescribeAccountLimits

Show DescribeAccountLimitsResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeAccountLimits

Show DescribeChangeSet 
Instance details

Defined in Amazonka.CloudFormation.DescribeChangeSet

Show DescribeChangeSetResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeChangeSet

Show DescribeChangeSetHooks 
Instance details

Defined in Amazonka.CloudFormation.DescribeChangeSetHooks

Show DescribeChangeSetHooksResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeChangeSetHooks

Show DescribePublisher 
Instance details

Defined in Amazonka.CloudFormation.DescribePublisher

Show DescribePublisherResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribePublisher

Show DescribeStackDriftDetectionStatus 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackDriftDetectionStatus

Show DescribeStackDriftDetectionStatusResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackDriftDetectionStatus

Show DescribeStackEvents 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackEvents

Show DescribeStackEventsResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackEvents

Show DescribeStackInstance 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackInstance

Show DescribeStackInstanceResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackInstance

Show DescribeStackResource 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackResource

Show DescribeStackResourceResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackResource

Show DescribeStackResourceDrifts 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackResourceDrifts

Show DescribeStackResourceDriftsResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackResourceDrifts

Show DescribeStackResources 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackResources

Show DescribeStackResourcesResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackResources

Show DescribeStackSet 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackSet

Show DescribeStackSetResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackSet

Show DescribeStackSetOperation 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackSetOperation

Show DescribeStackSetOperationResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackSetOperation

Show DescribeStacks 
Instance details

Defined in Amazonka.CloudFormation.DescribeStacks

Show DescribeStacksResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStacks

Show DescribeType 
Instance details

Defined in Amazonka.CloudFormation.DescribeType

Show DescribeTypeResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeType

Show DescribeTypeRegistration 
Instance details

Defined in Amazonka.CloudFormation.DescribeTypeRegistration

Show DescribeTypeRegistrationResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeTypeRegistration

Show DetectStackDrift 
Instance details

Defined in Amazonka.CloudFormation.DetectStackDrift

Show DetectStackDriftResponse 
Instance details

Defined in Amazonka.CloudFormation.DetectStackDrift

Show DetectStackResourceDrift 
Instance details

Defined in Amazonka.CloudFormation.DetectStackResourceDrift

Show DetectStackResourceDriftResponse 
Instance details

Defined in Amazonka.CloudFormation.DetectStackResourceDrift

Show DetectStackSetDrift 
Instance details

Defined in Amazonka.CloudFormation.DetectStackSetDrift

Show DetectStackSetDriftResponse 
Instance details

Defined in Amazonka.CloudFormation.DetectStackSetDrift

Show EstimateTemplateCost 
Instance details

Defined in Amazonka.CloudFormation.EstimateTemplateCost

Show EstimateTemplateCostResponse 
Instance details

Defined in Amazonka.CloudFormation.EstimateTemplateCost

Show ExecuteChangeSet 
Instance details

Defined in Amazonka.CloudFormation.ExecuteChangeSet

Show ExecuteChangeSetResponse 
Instance details

Defined in Amazonka.CloudFormation.ExecuteChangeSet

Show GetStackPolicy 
Instance details

Defined in Amazonka.CloudFormation.GetStackPolicy

Show GetStackPolicyResponse 
Instance details

Defined in Amazonka.CloudFormation.GetStackPolicy

Show GetTemplate 
Instance details

Defined in Amazonka.CloudFormation.GetTemplate

Show GetTemplateResponse 
Instance details

Defined in Amazonka.CloudFormation.GetTemplate

Show GetTemplateSummary 
Instance details

Defined in Amazonka.CloudFormation.GetTemplateSummary

Show GetTemplateSummaryResponse 
Instance details

Defined in Amazonka.CloudFormation.GetTemplateSummary

Show ImportStacksToStackSet 
Instance details

Defined in Amazonka.CloudFormation.ImportStacksToStackSet

Show ImportStacksToStackSetResponse 
Instance details

Defined in Amazonka.CloudFormation.ImportStacksToStackSet

Show ListChangeSets 
Instance details

Defined in Amazonka.CloudFormation.ListChangeSets

Show ListChangeSetsResponse 
Instance details

Defined in Amazonka.CloudFormation.ListChangeSets

Show ListExports 
Instance details

Defined in Amazonka.CloudFormation.ListExports

Show ListExportsResponse 
Instance details

Defined in Amazonka.CloudFormation.ListExports

Show ListImports 
Instance details

Defined in Amazonka.CloudFormation.ListImports

Show ListImportsResponse 
Instance details

Defined in Amazonka.CloudFormation.ListImports

Show ListStackInstances 
Instance details

Defined in Amazonka.CloudFormation.ListStackInstances

Show ListStackInstancesResponse 
Instance details

Defined in Amazonka.CloudFormation.ListStackInstances

Show ListStackResources 
Instance details

Defined in Amazonka.CloudFormation.ListStackResources

Show ListStackResourcesResponse 
Instance details

Defined in Amazonka.CloudFormation.ListStackResources

Show ListStackSetOperationResults 
Instance details

Defined in Amazonka.CloudFormation.ListStackSetOperationResults

Show ListStackSetOperationResultsResponse 
Instance details

Defined in Amazonka.CloudFormation.ListStackSetOperationResults

Show ListStackSetOperations 
Instance details

Defined in Amazonka.CloudFormation.ListStackSetOperations

Show ListStackSetOperationsResponse 
Instance details

Defined in Amazonka.CloudFormation.ListStackSetOperations

Show ListStackSets 
Instance details

Defined in Amazonka.CloudFormation.ListStackSets

Show ListStackSetsResponse 
Instance details

Defined in Amazonka.CloudFormation.ListStackSets

Show ListStacks 
Instance details

Defined in Amazonka.CloudFormation.ListStacks

Show ListStacksResponse 
Instance details

Defined in Amazonka.CloudFormation.ListStacks

Show ListTypeRegistrations 
Instance details

Defined in Amazonka.CloudFormation.ListTypeRegistrations

Show ListTypeRegistrationsResponse 
Instance details

Defined in Amazonka.CloudFormation.ListTypeRegistrations

Show ListTypeVersions 
Instance details

Defined in Amazonka.CloudFormation.ListTypeVersions

Show ListTypeVersionsResponse 
Instance details

Defined in Amazonka.CloudFormation.ListTypeVersions

Show ListTypes 
Instance details

Defined in Amazonka.CloudFormation.ListTypes

Show ListTypesResponse 
Instance details

Defined in Amazonka.CloudFormation.ListTypes

Show PublishType 
Instance details

Defined in Amazonka.CloudFormation.PublishType

Show PublishTypeResponse 
Instance details

Defined in Amazonka.CloudFormation.PublishType

Show RecordHandlerProgress 
Instance details

Defined in Amazonka.CloudFormation.RecordHandlerProgress

Show RecordHandlerProgressResponse 
Instance details

Defined in Amazonka.CloudFormation.RecordHandlerProgress

Show RegisterPublisher 
Instance details

Defined in Amazonka.CloudFormation.RegisterPublisher

Show RegisterPublisherResponse 
Instance details

Defined in Amazonka.CloudFormation.RegisterPublisher

Show RegisterType 
Instance details

Defined in Amazonka.CloudFormation.RegisterType

Show RegisterTypeResponse 
Instance details

Defined in Amazonka.CloudFormation.RegisterType

Show RollbackStack 
Instance details

Defined in Amazonka.CloudFormation.RollbackStack

Show RollbackStackResponse 
Instance details

Defined in Amazonka.CloudFormation.RollbackStack

Show SetStackPolicy 
Instance details

Defined in Amazonka.CloudFormation.SetStackPolicy

Show SetStackPolicyResponse 
Instance details

Defined in Amazonka.CloudFormation.SetStackPolicy

Show SetTypeConfiguration 
Instance details

Defined in Amazonka.CloudFormation.SetTypeConfiguration

Show SetTypeConfigurationResponse 
Instance details

Defined in Amazonka.CloudFormation.SetTypeConfiguration

Show SetTypeDefaultVersion 
Instance details

Defined in Amazonka.CloudFormation.SetTypeDefaultVersion

Show SetTypeDefaultVersionResponse 
Instance details

Defined in Amazonka.CloudFormation.SetTypeDefaultVersion

Show SignalResource 
Instance details

Defined in Amazonka.CloudFormation.SignalResource

Show SignalResourceResponse 
Instance details

Defined in Amazonka.CloudFormation.SignalResource

Show StopStackSetOperation 
Instance details

Defined in Amazonka.CloudFormation.StopStackSetOperation

Show StopStackSetOperationResponse 
Instance details

Defined in Amazonka.CloudFormation.StopStackSetOperation

Show TestType 
Instance details

Defined in Amazonka.CloudFormation.TestType

Show TestTypeResponse 
Instance details

Defined in Amazonka.CloudFormation.TestType

Show AccountFilterType 
Instance details

Defined in Amazonka.CloudFormation.Types.AccountFilterType

Show AccountGateResult 
Instance details

Defined in Amazonka.CloudFormation.Types.AccountGateResult

Show AccountGateStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.AccountGateStatus

Show AccountLimit 
Instance details

Defined in Amazonka.CloudFormation.Types.AccountLimit

Show AutoDeployment 
Instance details

Defined in Amazonka.CloudFormation.Types.AutoDeployment

Show BatchDescribeTypeConfigurationsError 
Instance details

Defined in Amazonka.CloudFormation.Types.BatchDescribeTypeConfigurationsError

Show CallAs 
Instance details

Defined in Amazonka.CloudFormation.Types.CallAs

Show Capability 
Instance details

Defined in Amazonka.CloudFormation.Types.Capability

Show Category 
Instance details

Defined in Amazonka.CloudFormation.Types.Category

Show Change 
Instance details

Defined in Amazonka.CloudFormation.Types.Change

Show ChangeAction 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeAction

Show ChangeSetHook 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetHook

Show ChangeSetHookResourceTargetDetails 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetHookResourceTargetDetails

Show ChangeSetHookTargetDetails 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetHookTargetDetails

Show ChangeSetHooksStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetHooksStatus

Show ChangeSetStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetStatus

Show ChangeSetSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetSummary

Show ChangeSetType 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetType

Show ChangeSource 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSource

Show ChangeType 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeType

Show DeploymentTargets 
Instance details

Defined in Amazonka.CloudFormation.Types.DeploymentTargets

Show DeprecatedStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.DeprecatedStatus

Show DifferenceType 
Instance details

Defined in Amazonka.CloudFormation.Types.DifferenceType

Show EvaluationType 
Instance details

Defined in Amazonka.CloudFormation.Types.EvaluationType

Show ExecutionStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.ExecutionStatus

Show Export 
Instance details

Defined in Amazonka.CloudFormation.Types.Export

Show HandlerErrorCode 
Instance details

Defined in Amazonka.CloudFormation.Types.HandlerErrorCode

Show HookFailureMode 
Instance details

Defined in Amazonka.CloudFormation.Types.HookFailureMode

Show HookInvocationPoint 
Instance details

Defined in Amazonka.CloudFormation.Types.HookInvocationPoint

Show HookStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.HookStatus

Show HookTargetType 
Instance details

Defined in Amazonka.CloudFormation.Types.HookTargetType

Show IdentityProvider 
Instance details

Defined in Amazonka.CloudFormation.Types.IdentityProvider

Show LoggingConfig 
Instance details

Defined in Amazonka.CloudFormation.Types.LoggingConfig

Show ManagedExecution 
Instance details

Defined in Amazonka.CloudFormation.Types.ManagedExecution

Show ModuleInfo 
Instance details

Defined in Amazonka.CloudFormation.Types.ModuleInfo

Show OnFailure 
Instance details

Defined in Amazonka.CloudFormation.Types.OnFailure

Show OperationResultFilter 
Instance details

Defined in Amazonka.CloudFormation.Types.OperationResultFilter

Show OperationResultFilterName 
Instance details

Defined in Amazonka.CloudFormation.Types.OperationResultFilterName

Show OperationStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.OperationStatus

Show Output 
Instance details

Defined in Amazonka.CloudFormation.Types.Output

Show Parameter 
Instance details

Defined in Amazonka.CloudFormation.Types.Parameter

Show ParameterConstraints 
Instance details

Defined in Amazonka.CloudFormation.Types.ParameterConstraints

Show ParameterDeclaration 
Instance details

Defined in Amazonka.CloudFormation.Types.ParameterDeclaration

Show PermissionModels 
Instance details

Defined in Amazonka.CloudFormation.Types.PermissionModels

Show PhysicalResourceIdContextKeyValuePair 
Instance details

Defined in Amazonka.CloudFormation.Types.PhysicalResourceIdContextKeyValuePair

Show PropertyDifference 
Instance details

Defined in Amazonka.CloudFormation.Types.PropertyDifference

Show ProvisioningType 
Instance details

Defined in Amazonka.CloudFormation.Types.ProvisioningType

Show PublisherStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.PublisherStatus

Show RegionConcurrencyType 
Instance details

Defined in Amazonka.CloudFormation.Types.RegionConcurrencyType

Show RegistrationStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.RegistrationStatus

Show RegistryType 
Instance details

Defined in Amazonka.CloudFormation.Types.RegistryType

Show Replacement 
Instance details

Defined in Amazonka.CloudFormation.Types.Replacement

Show RequiredActivatedType 
Instance details

Defined in Amazonka.CloudFormation.Types.RequiredActivatedType

Show RequiresRecreation 
Instance details

Defined in Amazonka.CloudFormation.Types.RequiresRecreation

Show ResourceAttribute 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceAttribute

Show ResourceChange 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceChange

Show ResourceChangeDetail 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceChangeDetail

Show ResourceIdentifierSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceIdentifierSummary

Show ResourceSignalStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceSignalStatus

Show ResourceStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceStatus

Show ResourceTargetDefinition 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceTargetDefinition

Show ResourceToImport 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceToImport

Show RollbackConfiguration 
Instance details

Defined in Amazonka.CloudFormation.Types.RollbackConfiguration

Show RollbackTrigger 
Instance details

Defined in Amazonka.CloudFormation.Types.RollbackTrigger

Show Stack 
Instance details

Defined in Amazonka.CloudFormation.Types.Stack

Methods

showsPrec :: Int -> Stack -> ShowS #

show :: Stack -> String #

showList :: [Stack] -> ShowS #

Show StackDriftDetectionStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackDriftDetectionStatus

Show StackDriftInformation 
Instance details

Defined in Amazonka.CloudFormation.Types.StackDriftInformation

Show StackDriftInformationSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackDriftInformationSummary

Show StackDriftStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackDriftStatus

Show StackEvent 
Instance details

Defined in Amazonka.CloudFormation.Types.StackEvent

Show StackInstance 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstance

Show StackInstanceComprehensiveStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstanceComprehensiveStatus

Show StackInstanceDetailedStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstanceDetailedStatus

Show StackInstanceFilter 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstanceFilter

Show StackInstanceFilterName 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstanceFilterName

Show StackInstanceStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstanceStatus

Show StackInstanceSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstanceSummary

Show StackResource 
Instance details

Defined in Amazonka.CloudFormation.Types.StackResource

Show StackResourceDetail 
Instance details

Defined in Amazonka.CloudFormation.Types.StackResourceDetail

Show StackResourceDrift 
Instance details

Defined in Amazonka.CloudFormation.Types.StackResourceDrift

Show StackResourceDriftInformation 
Instance details

Defined in Amazonka.CloudFormation.Types.StackResourceDriftInformation

Show StackResourceDriftInformationSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackResourceDriftInformationSummary

Show StackResourceDriftStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackResourceDriftStatus

Show StackResourceSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackResourceSummary

Show StackSet 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSet

Show StackSetDriftDetectionDetails 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetDriftDetectionDetails

Show StackSetDriftDetectionStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetDriftDetectionStatus

Show StackSetDriftStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetDriftStatus

Show StackSetOperation 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperation

Show StackSetOperationAction 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationAction

Show StackSetOperationPreferences 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationPreferences

Show StackSetOperationResultStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationResultStatus

Show StackSetOperationResultSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationResultSummary

Show StackSetOperationStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationStatus

Show StackSetOperationStatusDetails 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationStatusDetails

Show StackSetOperationSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationSummary

Show StackSetStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetStatus

Show StackSetSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetSummary

Show StackStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackStatus

Show StackSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSummary

Show Tag 
Instance details

Defined in Amazonka.CloudFormation.Types.Tag

Methods

showsPrec :: Int -> Tag -> ShowS #

show :: Tag -> String #

showList :: [Tag] -> ShowS #

Show TemplateParameter 
Instance details

Defined in Amazonka.CloudFormation.Types.TemplateParameter

Show TemplateStage 
Instance details

Defined in Amazonka.CloudFormation.Types.TemplateStage

Show ThirdPartyType 
Instance details

Defined in Amazonka.CloudFormation.Types.ThirdPartyType

Show TypeConfigurationDetails 
Instance details

Defined in Amazonka.CloudFormation.Types.TypeConfigurationDetails

Show TypeConfigurationIdentifier 
Instance details

Defined in Amazonka.CloudFormation.Types.TypeConfigurationIdentifier

Show TypeFilters 
Instance details

Defined in Amazonka.CloudFormation.Types.TypeFilters

Show TypeSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.TypeSummary

Show TypeTestsStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.TypeTestsStatus

Show TypeVersionSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.TypeVersionSummary

Show VersionBump 
Instance details

Defined in Amazonka.CloudFormation.Types.VersionBump

Show Visibility 
Instance details

Defined in Amazonka.CloudFormation.Types.Visibility

Show UpdateStack 
Instance details

Defined in Amazonka.CloudFormation.UpdateStack

Show UpdateStackResponse 
Instance details

Defined in Amazonka.CloudFormation.UpdateStack

Show UpdateStackInstances 
Instance details

Defined in Amazonka.CloudFormation.UpdateStackInstances

Show UpdateStackInstancesResponse 
Instance details

Defined in Amazonka.CloudFormation.UpdateStackInstances

Show UpdateStackSet 
Instance details

Defined in Amazonka.CloudFormation.UpdateStackSet

Show UpdateStackSetResponse 
Instance details

Defined in Amazonka.CloudFormation.UpdateStackSet

Show UpdateTerminationProtection 
Instance details

Defined in Amazonka.CloudFormation.UpdateTerminationProtection

Show UpdateTerminationProtectionResponse 
Instance details

Defined in Amazonka.CloudFormation.UpdateTerminationProtection

Show ValidateTemplate 
Instance details

Defined in Amazonka.CloudFormation.ValidateTemplate

Show ValidateTemplateResponse 
Instance details

Defined in Amazonka.CloudFormation.ValidateTemplate

Show Base64 
Instance details

Defined in Amazonka.Data.Base64

Show ChunkSize 
Instance details

Defined in Amazonka.Data.Body

Show ChunkedBody 
Instance details

Defined in Amazonka.Data.Body

Show HashedBody 
Instance details

Defined in Amazonka.Data.Body

Show RequestBody 
Instance details

Defined in Amazonka.Data.Body

Show ResponseBody 
Instance details

Defined in Amazonka.Data.Body

Show Encoding 
Instance details

Defined in Amazonka.Data.Path

Methods

showsPrec :: Int -> Encoding -> ShowS #

show :: Encoding -> String #

showList :: [Encoding] -> ShowS #

Show TwiceEscapedPath 
Instance details

Defined in Amazonka.Data.Path

Show QueryString 
Instance details

Defined in Amazonka.Data.Query

Show Format 
Instance details

Defined in Amazonka.Data.Time

Show Abbrev 
Instance details

Defined in Amazonka.Types

Show AccessKey 
Instance details

Defined in Amazonka.Types

Show AuthEnv 
Instance details

Defined in Amazonka.Types

Show Endpoint 
Instance details

Defined in Amazonka.Types

Show Error 
Instance details

Defined in Amazonka.Types

Methods

showsPrec :: Int -> Error -> ShowS #

show :: Error -> String #

showList :: [Error] -> ShowS #

Show ErrorCode 
Instance details

Defined in Amazonka.Types

Show ErrorMessage 
Instance details

Defined in Amazonka.Types

Show Region 
Instance details

Defined in Amazonka.Types

Show RequestId 
Instance details

Defined in Amazonka.Types

Show S3AddressingStyle 
Instance details

Defined in Amazonka.Types

Show Seconds 
Instance details

Defined in Amazonka.Types

Show SerializeError 
Instance details

Defined in Amazonka.Types

Show ServiceError 
Instance details

Defined in Amazonka.Types

Show Accept 
Instance details

Defined in Amazonka.Waiter

Show DescribeAvailabilityZones 
Instance details

Defined in Amazonka.EC2.DescribeAvailabilityZones

Show DescribeAvailabilityZonesResponse 
Instance details

Defined in Amazonka.EC2.DescribeAvailabilityZones

Show DeleteTag 
Instance details

Defined in Amazonka.EC2.Internal

Show AcceleratorCount 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorCount

Show AcceleratorCountRequest 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorCountRequest

Show AcceleratorManufacturer 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorManufacturer

Show AcceleratorName 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorName

Show AcceleratorTotalMemoryMiB 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorTotalMemoryMiB

Show AcceleratorTotalMemoryMiBRequest 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorTotalMemoryMiBRequest

Show AcceleratorType 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorType

Show AccessScopeAnalysisFinding 
Instance details

Defined in Amazonka.EC2.Types.AccessScopeAnalysisFinding

Show AccessScopePath 
Instance details

Defined in Amazonka.EC2.Types.AccessScopePath

Show AccessScopePathRequest 
Instance details

Defined in Amazonka.EC2.Types.AccessScopePathRequest

Show AccountAttribute 
Instance details

Defined in Amazonka.EC2.Types.AccountAttribute

Show AccountAttributeName 
Instance details

Defined in Amazonka.EC2.Types.AccountAttributeName

Show AccountAttributeValue 
Instance details

Defined in Amazonka.EC2.Types.AccountAttributeValue

Show ActiveInstance 
Instance details

Defined in Amazonka.EC2.Types.ActiveInstance

Show ActivityStatus 
Instance details

Defined in Amazonka.EC2.Types.ActivityStatus

Show AddIpamOperatingRegion 
Instance details

Defined in Amazonka.EC2.Types.AddIpamOperatingRegion

Show AddPrefixListEntry 
Instance details

Defined in Amazonka.EC2.Types.AddPrefixListEntry

Show AddedPrincipal 
Instance details

Defined in Amazonka.EC2.Types.AddedPrincipal

Show AdditionalDetail 
Instance details

Defined in Amazonka.EC2.Types.AdditionalDetail

Show Address 
Instance details

Defined in Amazonka.EC2.Types.Address

Show AddressAttribute 
Instance details

Defined in Amazonka.EC2.Types.AddressAttribute

Show AddressAttributeName 
Instance details

Defined in Amazonka.EC2.Types.AddressAttributeName

Show AddressFamily 
Instance details

Defined in Amazonka.EC2.Types.AddressFamily

Show AddressStatus 
Instance details

Defined in Amazonka.EC2.Types.AddressStatus

Show AddressTransfer 
Instance details

Defined in Amazonka.EC2.Types.AddressTransfer

Show AddressTransferStatus 
Instance details

Defined in Amazonka.EC2.Types.AddressTransferStatus

Show Affinity 
Instance details

Defined in Amazonka.EC2.Types.Affinity

Show AllocationState 
Instance details

Defined in Amazonka.EC2.Types.AllocationState

Show AllocationStrategy 
Instance details

Defined in Amazonka.EC2.Types.AllocationStrategy

Show AllocationType 
Instance details

Defined in Amazonka.EC2.Types.AllocationType

Show AllowedPrincipal 
Instance details

Defined in Amazonka.EC2.Types.AllowedPrincipal

Show AllowsMultipleInstanceTypes 
Instance details

Defined in Amazonka.EC2.Types.AllowsMultipleInstanceTypes

Show AlternatePathHint 
Instance details

Defined in Amazonka.EC2.Types.AlternatePathHint

Show AnalysisAclRule 
Instance details

Defined in Amazonka.EC2.Types.AnalysisAclRule

Show AnalysisComponent 
Instance details

Defined in Amazonka.EC2.Types.AnalysisComponent

Show AnalysisLoadBalancerListener 
Instance details

Defined in Amazonka.EC2.Types.AnalysisLoadBalancerListener

Show AnalysisLoadBalancerTarget 
Instance details

Defined in Amazonka.EC2.Types.AnalysisLoadBalancerTarget

Show AnalysisPacketHeader 
Instance details

Defined in Amazonka.EC2.Types.AnalysisPacketHeader

Show AnalysisRouteTableRoute 
Instance details

Defined in Amazonka.EC2.Types.AnalysisRouteTableRoute

Show AnalysisSecurityGroupRule 
Instance details

Defined in Amazonka.EC2.Types.AnalysisSecurityGroupRule

Show AnalysisStatus 
Instance details

Defined in Amazonka.EC2.Types.AnalysisStatus

Show ApplianceModeSupportValue 
Instance details

Defined in Amazonka.EC2.Types.ApplianceModeSupportValue

Show ArchitectureType 
Instance details

Defined in Amazonka.EC2.Types.ArchitectureType

Show ArchitectureValues 
Instance details

Defined in Amazonka.EC2.Types.ArchitectureValues

Show AssignedPrivateIpAddress 
Instance details

Defined in Amazonka.EC2.Types.AssignedPrivateIpAddress

Show AssociatedNetworkType 
Instance details

Defined in Amazonka.EC2.Types.AssociatedNetworkType

Show AssociatedRole 
Instance details

Defined in Amazonka.EC2.Types.AssociatedRole

Show AssociatedTargetNetwork 
Instance details

Defined in Amazonka.EC2.Types.AssociatedTargetNetwork

Show AssociationStatus 
Instance details

Defined in Amazonka.EC2.Types.AssociationStatus

Show AssociationStatusCode 
Instance details

Defined in Amazonka.EC2.Types.AssociationStatusCode

Show AthenaIntegration 
Instance details

Defined in Amazonka.EC2.Types.AthenaIntegration

Show AttachmentEnaSrdSpecification 
Instance details

Defined in Amazonka.EC2.Types.AttachmentEnaSrdSpecification

Show AttachmentEnaSrdUdpSpecification 
Instance details

Defined in Amazonka.EC2.Types.AttachmentEnaSrdUdpSpecification

Show AttachmentStatus 
Instance details

Defined in Amazonka.EC2.Types.AttachmentStatus

Show AttributeBooleanValue 
Instance details

Defined in Amazonka.EC2.Types.AttributeBooleanValue

Show AttributeValue 
Instance details

Defined in Amazonka.EC2.Types.AttributeValue

Show AuthorizationRule 
Instance details

Defined in Amazonka.EC2.Types.AuthorizationRule

Show AutoAcceptSharedAssociationsValue 
Instance details

Defined in Amazonka.EC2.Types.AutoAcceptSharedAssociationsValue

Show AutoAcceptSharedAttachmentsValue 
Instance details

Defined in Amazonka.EC2.Types.AutoAcceptSharedAttachmentsValue

Show AutoPlacement 
Instance details

Defined in Amazonka.EC2.Types.AutoPlacement

Show AvailabilityZone 
Instance details

Defined in Amazonka.EC2.Types.AvailabilityZone

Show AvailabilityZoneMessage 
Instance details

Defined in Amazonka.EC2.Types.AvailabilityZoneMessage

Show AvailabilityZoneOptInStatus 
Instance details

Defined in Amazonka.EC2.Types.AvailabilityZoneOptInStatus

Show AvailabilityZoneState 
Instance details

Defined in Amazonka.EC2.Types.AvailabilityZoneState

Show AvailableCapacity 
Instance details

Defined in Amazonka.EC2.Types.AvailableCapacity

Show BareMetal 
Instance details

Defined in Amazonka.EC2.Types.BareMetal

Show BaselineEbsBandwidthMbps 
Instance details

Defined in Amazonka.EC2.Types.BaselineEbsBandwidthMbps

Show BaselineEbsBandwidthMbpsRequest 
Instance details

Defined in Amazonka.EC2.Types.BaselineEbsBandwidthMbpsRequest

Show BatchState 
Instance details

Defined in Amazonka.EC2.Types.BatchState

Show BgpStatus 
Instance details

Defined in Amazonka.EC2.Types.BgpStatus

Show BlobAttributeValue 
Instance details

Defined in Amazonka.EC2.Types.BlobAttributeValue

Show BlockDeviceMapping 
Instance details

Defined in Amazonka.EC2.Types.BlockDeviceMapping

Show BootModeType 
Instance details

Defined in Amazonka.EC2.Types.BootModeType

Show BootModeValues 
Instance details

Defined in Amazonka.EC2.Types.BootModeValues

Show BundleTask 
Instance details

Defined in Amazonka.EC2.Types.BundleTask

Show BundleTaskError 
Instance details

Defined in Amazonka.EC2.Types.BundleTaskError

Show BundleTaskState 
Instance details

Defined in Amazonka.EC2.Types.BundleTaskState

Show BurstablePerformance 
Instance details

Defined in Amazonka.EC2.Types.BurstablePerformance

Show ByoipCidr 
Instance details

Defined in Amazonka.EC2.Types.ByoipCidr

Show ByoipCidrState 
Instance details

Defined in Amazonka.EC2.Types.ByoipCidrState

Show CancelBatchErrorCode 
Instance details

Defined in Amazonka.EC2.Types.CancelBatchErrorCode

Show CancelCapacityReservationFleetError 
Instance details

Defined in Amazonka.EC2.Types.CancelCapacityReservationFleetError

Show CancelSpotFleetRequestsError 
Instance details

Defined in Amazonka.EC2.Types.CancelSpotFleetRequestsError

Show CancelSpotFleetRequestsErrorItem 
Instance details

Defined in Amazonka.EC2.Types.CancelSpotFleetRequestsErrorItem

Show CancelSpotFleetRequestsSuccessItem 
Instance details

Defined in Amazonka.EC2.Types.CancelSpotFleetRequestsSuccessItem

Show CancelSpotInstanceRequestState 
Instance details

Defined in Amazonka.EC2.Types.CancelSpotInstanceRequestState

Show CancelledSpotInstanceRequest 
Instance details

Defined in Amazonka.EC2.Types.CancelledSpotInstanceRequest

Show CapacityAllocation 
Instance details

Defined in Amazonka.EC2.Types.CapacityAllocation

Show CapacityReservation 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservation

Show CapacityReservationFleet 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationFleet

Show CapacityReservationFleetCancellationState 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationFleetCancellationState

Show CapacityReservationFleetState 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationFleetState

Show CapacityReservationGroup 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationGroup

Show CapacityReservationInstancePlatform 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationInstancePlatform

Show CapacityReservationOptions 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationOptions

Show CapacityReservationOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationOptionsRequest

Show CapacityReservationPreference 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationPreference

Show CapacityReservationSpecification 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationSpecification

Show CapacityReservationSpecificationResponse 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationSpecificationResponse

Show CapacityReservationState 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationState

Show CapacityReservationTarget 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationTarget

Show CapacityReservationTargetResponse 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationTargetResponse

Show CapacityReservationTenancy 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationTenancy

Show CarrierGateway 
Instance details

Defined in Amazonka.EC2.Types.CarrierGateway

Show CarrierGatewayState 
Instance details

Defined in Amazonka.EC2.Types.CarrierGatewayState

Show CertificateAuthentication 
Instance details

Defined in Amazonka.EC2.Types.CertificateAuthentication

Show CertificateAuthenticationRequest 
Instance details

Defined in Amazonka.EC2.Types.CertificateAuthenticationRequest

Show CidrAuthorizationContext 
Instance details

Defined in Amazonka.EC2.Types.CidrAuthorizationContext

Show CidrBlock 
Instance details

Defined in Amazonka.EC2.Types.CidrBlock

Show ClassicLinkDnsSupport 
Instance details

Defined in Amazonka.EC2.Types.ClassicLinkDnsSupport

Show ClassicLinkInstance 
Instance details

Defined in Amazonka.EC2.Types.ClassicLinkInstance

Show ClassicLoadBalancer 
Instance details

Defined in Amazonka.EC2.Types.ClassicLoadBalancer

Show ClassicLoadBalancersConfig 
Instance details

Defined in Amazonka.EC2.Types.ClassicLoadBalancersConfig

Show ClientCertificateRevocationListStatus 
Instance details

Defined in Amazonka.EC2.Types.ClientCertificateRevocationListStatus

Show ClientCertificateRevocationListStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientCertificateRevocationListStatusCode

Show ClientConnectOptions 
Instance details

Defined in Amazonka.EC2.Types.ClientConnectOptions

Show ClientConnectResponseOptions 
Instance details

Defined in Amazonka.EC2.Types.ClientConnectResponseOptions

Show ClientData 
Instance details

Defined in Amazonka.EC2.Types.ClientData

Show ClientLoginBannerOptions 
Instance details

Defined in Amazonka.EC2.Types.ClientLoginBannerOptions

Show ClientLoginBannerResponseOptions 
Instance details

Defined in Amazonka.EC2.Types.ClientLoginBannerResponseOptions

Show ClientVpnAuthentication 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnAuthentication

Show ClientVpnAuthenticationRequest 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnAuthenticationRequest

Show ClientVpnAuthenticationType 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnAuthenticationType

Show ClientVpnAuthorizationRuleStatus 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnAuthorizationRuleStatus

Show ClientVpnAuthorizationRuleStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnAuthorizationRuleStatusCode

Show ClientVpnConnection 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnConnection

Show ClientVpnConnectionStatus 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnConnectionStatus

Show ClientVpnConnectionStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnConnectionStatusCode

Show ClientVpnEndpoint 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnEndpoint

Show ClientVpnEndpointAttributeStatus 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnEndpointAttributeStatus

Show ClientVpnEndpointAttributeStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnEndpointAttributeStatusCode

Show ClientVpnEndpointStatus 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnEndpointStatus

Show ClientVpnEndpointStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnEndpointStatusCode

Show ClientVpnRoute 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnRoute

Show ClientVpnRouteStatus 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnRouteStatus

Show ClientVpnRouteStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnRouteStatusCode

Show CloudWatchLogOptions 
Instance details

Defined in Amazonka.EC2.Types.CloudWatchLogOptions

Show CloudWatchLogOptionsSpecification 
Instance details

Defined in Amazonka.EC2.Types.CloudWatchLogOptionsSpecification

Show CoipAddressUsage 
Instance details

Defined in Amazonka.EC2.Types.CoipAddressUsage

Show CoipCidr 
Instance details

Defined in Amazonka.EC2.Types.CoipCidr

Show CoipPool 
Instance details

Defined in Amazonka.EC2.Types.CoipPool

Show ConnectionLogOptions 
Instance details

Defined in Amazonka.EC2.Types.ConnectionLogOptions

Show ConnectionLogResponseOptions 
Instance details

Defined in Amazonka.EC2.Types.ConnectionLogResponseOptions

Show ConnectionNotification 
Instance details

Defined in Amazonka.EC2.Types.ConnectionNotification

Show ConnectionNotificationState 
Instance details

Defined in Amazonka.EC2.Types.ConnectionNotificationState

Show ConnectionNotificationType 
Instance details

Defined in Amazonka.EC2.Types.ConnectionNotificationType

Show ConnectivityType 
Instance details

Defined in Amazonka.EC2.Types.ConnectivityType

Show ContainerFormat 
Instance details

Defined in Amazonka.EC2.Types.ContainerFormat

Show ConversionTask 
Instance details

Defined in Amazonka.EC2.Types.ConversionTask

Show ConversionTaskState 
Instance details

Defined in Amazonka.EC2.Types.ConversionTaskState

Show CopyTagsFromSource 
Instance details

Defined in Amazonka.EC2.Types.CopyTagsFromSource

Show CpuManufacturer 
Instance details

Defined in Amazonka.EC2.Types.CpuManufacturer

Show CpuOptions 
Instance details

Defined in Amazonka.EC2.Types.CpuOptions

Show CpuOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.CpuOptionsRequest

Show CreateFleetError 
Instance details

Defined in Amazonka.EC2.Types.CreateFleetError

Show CreateFleetInstance 
Instance details

Defined in Amazonka.EC2.Types.CreateFleetInstance

Show CreateTransitGatewayConnectRequestOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateTransitGatewayConnectRequestOptions

Show CreateTransitGatewayMulticastDomainRequestOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateTransitGatewayMulticastDomainRequestOptions

Show CreateTransitGatewayPeeringAttachmentRequestOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateTransitGatewayPeeringAttachmentRequestOptions

Show CreateTransitGatewayVpcAttachmentRequestOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateTransitGatewayVpcAttachmentRequestOptions

Show CreateVerifiedAccessEndpointEniOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateVerifiedAccessEndpointEniOptions

Show CreateVerifiedAccessEndpointLoadBalancerOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateVerifiedAccessEndpointLoadBalancerOptions

Show CreateVerifiedAccessTrustProviderDeviceOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateVerifiedAccessTrustProviderDeviceOptions

Show CreateVerifiedAccessTrustProviderOidcOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateVerifiedAccessTrustProviderOidcOptions

Show CreateVolumePermission 
Instance details

Defined in Amazonka.EC2.Types.CreateVolumePermission

Show CreateVolumePermissionModifications 
Instance details

Defined in Amazonka.EC2.Types.CreateVolumePermissionModifications

Show CreditSpecification 
Instance details

Defined in Amazonka.EC2.Types.CreditSpecification

Show CreditSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.CreditSpecificationRequest

Show CurrencyCodeValues 
Instance details

Defined in Amazonka.EC2.Types.CurrencyCodeValues

Show CustomerGateway 
Instance details

Defined in Amazonka.EC2.Types.CustomerGateway

Show DataQuery 
Instance details

Defined in Amazonka.EC2.Types.DataQuery

Show DataResponse 
Instance details

Defined in Amazonka.EC2.Types.DataResponse

Show DatafeedSubscriptionState 
Instance details

Defined in Amazonka.EC2.Types.DatafeedSubscriptionState

Show DefaultRouteTableAssociationValue 
Instance details

Defined in Amazonka.EC2.Types.DefaultRouteTableAssociationValue

Show DefaultRouteTablePropagationValue 
Instance details

Defined in Amazonka.EC2.Types.DefaultRouteTablePropagationValue

Show DefaultTargetCapacityType 
Instance details

Defined in Amazonka.EC2.Types.DefaultTargetCapacityType

Show DeleteFleetError 
Instance details

Defined in Amazonka.EC2.Types.DeleteFleetError

Show DeleteFleetErrorCode 
Instance details

Defined in Amazonka.EC2.Types.DeleteFleetErrorCode

Show DeleteFleetErrorItem 
Instance details

Defined in Amazonka.EC2.Types.DeleteFleetErrorItem

Show DeleteFleetSuccessItem 
Instance details

Defined in Amazonka.EC2.Types.DeleteFleetSuccessItem

Show DeleteLaunchTemplateVersionsResponseErrorItem 
Instance details

Defined in Amazonka.EC2.Types.DeleteLaunchTemplateVersionsResponseErrorItem

Show DeleteLaunchTemplateVersionsResponseSuccessItem 
Instance details

Defined in Amazonka.EC2.Types.DeleteLaunchTemplateVersionsResponseSuccessItem

Show DeleteQueuedReservedInstancesError 
Instance details

Defined in Amazonka.EC2.Types.DeleteQueuedReservedInstancesError

Show DeleteQueuedReservedInstancesErrorCode 
Instance details

Defined in Amazonka.EC2.Types.DeleteQueuedReservedInstancesErrorCode

Show DeregisterInstanceTagAttributeRequest 
Instance details

Defined in Amazonka.EC2.Types.DeregisterInstanceTagAttributeRequest

Show DescribeFastLaunchImagesSuccessItem 
Instance details

Defined in Amazonka.EC2.Types.DescribeFastLaunchImagesSuccessItem

Show DescribeFastSnapshotRestoreSuccessItem 
Instance details

Defined in Amazonka.EC2.Types.DescribeFastSnapshotRestoreSuccessItem

Show DescribeFleetError 
Instance details

Defined in Amazonka.EC2.Types.DescribeFleetError

Show DescribeFleetsInstances 
Instance details

Defined in Amazonka.EC2.Types.DescribeFleetsInstances

Show DestinationFileFormat 
Instance details

Defined in Amazonka.EC2.Types.DestinationFileFormat

Show DestinationOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.DestinationOptionsRequest

Show DestinationOptionsResponse 
Instance details

Defined in Amazonka.EC2.Types.DestinationOptionsResponse

Show DeviceOptions 
Instance details

Defined in Amazonka.EC2.Types.DeviceOptions

Show DeviceTrustProviderType 
Instance details

Defined in Amazonka.EC2.Types.DeviceTrustProviderType

Show DeviceType 
Instance details

Defined in Amazonka.EC2.Types.DeviceType

Show DhcpConfiguration 
Instance details

Defined in Amazonka.EC2.Types.DhcpConfiguration

Show DhcpOptions 
Instance details

Defined in Amazonka.EC2.Types.DhcpOptions

Show DirectoryServiceAuthentication 
Instance details

Defined in Amazonka.EC2.Types.DirectoryServiceAuthentication

Show DirectoryServiceAuthenticationRequest 
Instance details

Defined in Amazonka.EC2.Types.DirectoryServiceAuthenticationRequest

Show DisableFastSnapshotRestoreErrorItem 
Instance details

Defined in Amazonka.EC2.Types.DisableFastSnapshotRestoreErrorItem

Show DisableFastSnapshotRestoreStateError 
Instance details

Defined in Amazonka.EC2.Types.DisableFastSnapshotRestoreStateError

Show DisableFastSnapshotRestoreStateErrorItem 
Instance details

Defined in Amazonka.EC2.Types.DisableFastSnapshotRestoreStateErrorItem

Show DisableFastSnapshotRestoreSuccessItem 
Instance details

Defined in Amazonka.EC2.Types.DisableFastSnapshotRestoreSuccessItem

Show DiskImage 
Instance details

Defined in Amazonka.EC2.Types.DiskImage

Show DiskImageDescription 
Instance details

Defined in Amazonka.EC2.Types.DiskImageDescription

Show DiskImageDetail 
Instance details

Defined in Amazonka.EC2.Types.DiskImageDetail

Show DiskImageFormat 
Instance details

Defined in Amazonka.EC2.Types.DiskImageFormat

Show DiskImageVolumeDescription 
Instance details

Defined in Amazonka.EC2.Types.DiskImageVolumeDescription

Show DiskInfo 
Instance details

Defined in Amazonka.EC2.Types.DiskInfo

Show DiskType 
Instance details

Defined in Amazonka.EC2.Types.DiskType

Show DnsEntry 
Instance details

Defined in Amazonka.EC2.Types.DnsEntry

Show DnsNameState 
Instance details

Defined in Amazonka.EC2.Types.DnsNameState

Show DnsOptions 
Instance details

Defined in Amazonka.EC2.Types.DnsOptions

Show DnsOptionsSpecification 
Instance details

Defined in Amazonka.EC2.Types.DnsOptionsSpecification

Show DnsRecordIpType 
Instance details

Defined in Amazonka.EC2.Types.DnsRecordIpType

Show DnsServersOptionsModifyStructure 
Instance details

Defined in Amazonka.EC2.Types.DnsServersOptionsModifyStructure

Show DnsSupportValue 
Instance details

Defined in Amazonka.EC2.Types.DnsSupportValue

Show DomainType 
Instance details

Defined in Amazonka.EC2.Types.DomainType

Show DynamicRoutingValue 
Instance details

Defined in Amazonka.EC2.Types.DynamicRoutingValue

Show EbsBlockDevice 
Instance details

Defined in Amazonka.EC2.Types.EbsBlockDevice

Show EbsEncryptionSupport 
Instance details

Defined in Amazonka.EC2.Types.EbsEncryptionSupport

Show EbsInfo 
Instance details

Defined in Amazonka.EC2.Types.EbsInfo

Show EbsInstanceBlockDevice 
Instance details

Defined in Amazonka.EC2.Types.EbsInstanceBlockDevice

Show EbsInstanceBlockDeviceSpecification 
Instance details

Defined in Amazonka.EC2.Types.EbsInstanceBlockDeviceSpecification

Show EbsNvmeSupport 
Instance details

Defined in Amazonka.EC2.Types.EbsNvmeSupport

Show EbsOptimizedInfo 
Instance details

Defined in Amazonka.EC2.Types.EbsOptimizedInfo

Show EbsOptimizedSupport 
Instance details

Defined in Amazonka.EC2.Types.EbsOptimizedSupport

Show EfaInfo 
Instance details

Defined in Amazonka.EC2.Types.EfaInfo

Show EgressOnlyInternetGateway 
Instance details

Defined in Amazonka.EC2.Types.EgressOnlyInternetGateway

Show ElasticGpuAssociation 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpuAssociation

Show ElasticGpuHealth 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpuHealth

Show ElasticGpuSpecification 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpuSpecification

Show ElasticGpuSpecificationResponse 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpuSpecificationResponse

Show ElasticGpuState 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpuState

Show ElasticGpuStatus 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpuStatus

Show ElasticGpus 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpus

Show ElasticInferenceAccelerator 
Instance details

Defined in Amazonka.EC2.Types.ElasticInferenceAccelerator

Show ElasticInferenceAcceleratorAssociation 
Instance details

Defined in Amazonka.EC2.Types.ElasticInferenceAcceleratorAssociation

Show EnaSrdSpecification 
Instance details

Defined in Amazonka.EC2.Types.EnaSrdSpecification

Show EnaSrdUdpSpecification 
Instance details

Defined in Amazonka.EC2.Types.EnaSrdUdpSpecification

Show EnaSupport 
Instance details

Defined in Amazonka.EC2.Types.EnaSupport

Show EnableFastSnapshotRestoreErrorItem 
Instance details

Defined in Amazonka.EC2.Types.EnableFastSnapshotRestoreErrorItem

Show EnableFastSnapshotRestoreStateError 
Instance details

Defined in Amazonka.EC2.Types.EnableFastSnapshotRestoreStateError

Show EnableFastSnapshotRestoreStateErrorItem 
Instance details

Defined in Amazonka.EC2.Types.EnableFastSnapshotRestoreStateErrorItem

Show EnableFastSnapshotRestoreSuccessItem 
Instance details

Defined in Amazonka.EC2.Types.EnableFastSnapshotRestoreSuccessItem

Show EnclaveOptions 
Instance details

Defined in Amazonka.EC2.Types.EnclaveOptions

Show EnclaveOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.EnclaveOptionsRequest

Show EndDateType 
Instance details

Defined in Amazonka.EC2.Types.EndDateType

Show EphemeralNvmeSupport 
Instance details

Defined in Amazonka.EC2.Types.EphemeralNvmeSupport

Show EventCode 
Instance details

Defined in Amazonka.EC2.Types.EventCode

Show EventInformation 
Instance details

Defined in Amazonka.EC2.Types.EventInformation

Show EventType 
Instance details

Defined in Amazonka.EC2.Types.EventType

Show ExcessCapacityTerminationPolicy 
Instance details

Defined in Amazonka.EC2.Types.ExcessCapacityTerminationPolicy

Show Explanation 
Instance details

Defined in Amazonka.EC2.Types.Explanation

Show ExportEnvironment 
Instance details

Defined in Amazonka.EC2.Types.ExportEnvironment

Show ExportImageTask 
Instance details

Defined in Amazonka.EC2.Types.ExportImageTask

Show ExportTask 
Instance details

Defined in Amazonka.EC2.Types.ExportTask

Show ExportTaskS3Location 
Instance details

Defined in Amazonka.EC2.Types.ExportTaskS3Location

Show ExportTaskS3LocationRequest 
Instance details

Defined in Amazonka.EC2.Types.ExportTaskS3LocationRequest

Show ExportTaskState 
Instance details

Defined in Amazonka.EC2.Types.ExportTaskState

Show ExportToS3Task 
Instance details

Defined in Amazonka.EC2.Types.ExportToS3Task

Show ExportToS3TaskSpecification 
Instance details

Defined in Amazonka.EC2.Types.ExportToS3TaskSpecification

Show FailedCapacityReservationFleetCancellationResult 
Instance details

Defined in Amazonka.EC2.Types.FailedCapacityReservationFleetCancellationResult

Show FailedQueuedPurchaseDeletion 
Instance details

Defined in Amazonka.EC2.Types.FailedQueuedPurchaseDeletion

Show FastLaunchLaunchTemplateSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.FastLaunchLaunchTemplateSpecificationRequest

Show FastLaunchLaunchTemplateSpecificationResponse 
Instance details

Defined in Amazonka.EC2.Types.FastLaunchLaunchTemplateSpecificationResponse

Show FastLaunchResourceType 
Instance details

Defined in Amazonka.EC2.Types.FastLaunchResourceType

Show FastLaunchSnapshotConfigurationRequest 
Instance details

Defined in Amazonka.EC2.Types.FastLaunchSnapshotConfigurationRequest

Show FastLaunchSnapshotConfigurationResponse 
Instance details

Defined in Amazonka.EC2.Types.FastLaunchSnapshotConfigurationResponse

Show FastLaunchStateCode 
Instance details

Defined in Amazonka.EC2.Types.FastLaunchStateCode

Show FastSnapshotRestoreStateCode 
Instance details

Defined in Amazonka.EC2.Types.FastSnapshotRestoreStateCode

Show FederatedAuthentication 
Instance details

Defined in Amazonka.EC2.Types.FederatedAuthentication

Show FederatedAuthenticationRequest 
Instance details

Defined in Amazonka.EC2.Types.FederatedAuthenticationRequest

Show Filter 
Instance details

Defined in Amazonka.EC2.Types.Filter

Show FindingsFound 
Instance details

Defined in Amazonka.EC2.Types.FindingsFound

Show FleetActivityStatus 
Instance details

Defined in Amazonka.EC2.Types.FleetActivityStatus

Show FleetCapacityReservation 
Instance details

Defined in Amazonka.EC2.Types.FleetCapacityReservation

Show FleetCapacityReservationTenancy 
Instance details

Defined in Amazonka.EC2.Types.FleetCapacityReservationTenancy

Show FleetCapacityReservationUsageStrategy 
Instance details

Defined in Amazonka.EC2.Types.FleetCapacityReservationUsageStrategy

Show FleetData 
Instance details

Defined in Amazonka.EC2.Types.FleetData

Show FleetEventType 
Instance details

Defined in Amazonka.EC2.Types.FleetEventType

Show FleetExcessCapacityTerminationPolicy 
Instance details

Defined in Amazonka.EC2.Types.FleetExcessCapacityTerminationPolicy

Show FleetInstanceMatchCriteria 
Instance details

Defined in Amazonka.EC2.Types.FleetInstanceMatchCriteria

Show FleetLaunchTemplateConfig 
Instance details

Defined in Amazonka.EC2.Types.FleetLaunchTemplateConfig

Show FleetLaunchTemplateConfigRequest 
Instance details

Defined in Amazonka.EC2.Types.FleetLaunchTemplateConfigRequest

Show FleetLaunchTemplateOverrides 
Instance details

Defined in Amazonka.EC2.Types.FleetLaunchTemplateOverrides

Show FleetLaunchTemplateOverridesRequest 
Instance details

Defined in Amazonka.EC2.Types.FleetLaunchTemplateOverridesRequest

Show FleetLaunchTemplateSpecification 
Instance details

Defined in Amazonka.EC2.Types.FleetLaunchTemplateSpecification

Show FleetLaunchTemplateSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.FleetLaunchTemplateSpecificationRequest

Show FleetOnDemandAllocationStrategy 
Instance details

Defined in Amazonka.EC2.Types.FleetOnDemandAllocationStrategy

Show FleetReplacementStrategy 
Instance details

Defined in Amazonka.EC2.Types.FleetReplacementStrategy

Show FleetSpotCapacityRebalance 
Instance details

Defined in Amazonka.EC2.Types.FleetSpotCapacityRebalance

Show FleetSpotCapacityRebalanceRequest 
Instance details

Defined in Amazonka.EC2.Types.FleetSpotCapacityRebalanceRequest

Show FleetSpotMaintenanceStrategies 
Instance details

Defined in Amazonka.EC2.Types.FleetSpotMaintenanceStrategies

Show FleetSpotMaintenanceStrategiesRequest 
Instance details

Defined in Amazonka.EC2.Types.FleetSpotMaintenanceStrategiesRequest

Show FleetStateCode 
Instance details

Defined in Amazonka.EC2.Types.FleetStateCode

Show FleetType 
Instance details

Defined in Amazonka.EC2.Types.FleetType

Show FlowLog 
Instance details

Defined in Amazonka.EC2.Types.FlowLog

Show FlowLogsResourceType 
Instance details

Defined in Amazonka.EC2.Types.FlowLogsResourceType

Show FpgaDeviceInfo 
Instance details

Defined in Amazonka.EC2.Types.FpgaDeviceInfo

Show FpgaDeviceMemoryInfo 
Instance details

Defined in Amazonka.EC2.Types.FpgaDeviceMemoryInfo

Show FpgaImage 
Instance details

Defined in Amazonka.EC2.Types.FpgaImage

Show FpgaImageAttribute 
Instance details

Defined in Amazonka.EC2.Types.FpgaImageAttribute

Show FpgaImageAttributeName 
Instance details

Defined in Amazonka.EC2.Types.FpgaImageAttributeName

Show FpgaImageState 
Instance details

Defined in Amazonka.EC2.Types.FpgaImageState

Show FpgaImageStateCode 
Instance details

Defined in Amazonka.EC2.Types.FpgaImageStateCode

Show FpgaInfo 
Instance details

Defined in Amazonka.EC2.Types.FpgaInfo

Show GatewayAssociationState 
Instance details

Defined in Amazonka.EC2.Types.GatewayAssociationState

Show GatewayType 
Instance details

Defined in Amazonka.EC2.Types.GatewayType

Show GpuDeviceInfo 
Instance details

Defined in Amazonka.EC2.Types.GpuDeviceInfo

Show GpuDeviceMemoryInfo 
Instance details

Defined in Amazonka.EC2.Types.GpuDeviceMemoryInfo

Show GpuInfo 
Instance details

Defined in Amazonka.EC2.Types.GpuInfo

Show GroupIdentifier 
Instance details

Defined in Amazonka.EC2.Types.GroupIdentifier

Show HibernationOptions 
Instance details

Defined in Amazonka.EC2.Types.HibernationOptions

Show HibernationOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.HibernationOptionsRequest

Show HistoryRecord 
Instance details

Defined in Amazonka.EC2.Types.HistoryRecord

Show HistoryRecordEntry 
Instance details

Defined in Amazonka.EC2.Types.HistoryRecordEntry

Show Host 
Instance details

Defined in Amazonka.EC2.Types.Host

Methods

showsPrec :: Int -> Host -> ShowS #

show :: Host -> String #

showList :: [Host] -> ShowS #

Show HostInstance 
Instance details

Defined in Amazonka.EC2.Types.HostInstance

Show HostOffering 
Instance details

Defined in Amazonka.EC2.Types.HostOffering

Show HostProperties 
Instance details

Defined in Amazonka.EC2.Types.HostProperties

Show HostRecovery 
Instance details

Defined in Amazonka.EC2.Types.HostRecovery

Show HostReservation 
Instance details

Defined in Amazonka.EC2.Types.HostReservation

Show HostTenancy 
Instance details

Defined in Amazonka.EC2.Types.HostTenancy

Show HostnameType 
Instance details

Defined in Amazonka.EC2.Types.HostnameType

Show HttpTokensState 
Instance details

Defined in Amazonka.EC2.Types.HttpTokensState

Show HypervisorType 
Instance details

Defined in Amazonka.EC2.Types.HypervisorType

Show IKEVersionsListValue 
Instance details

Defined in Amazonka.EC2.Types.IKEVersionsListValue

Show IKEVersionsRequestListValue 
Instance details

Defined in Amazonka.EC2.Types.IKEVersionsRequestListValue

Show IamInstanceProfile 
Instance details

Defined in Amazonka.EC2.Types.IamInstanceProfile

Show IamInstanceProfileAssociation 
Instance details

Defined in Amazonka.EC2.Types.IamInstanceProfileAssociation

Show IamInstanceProfileAssociationState 
Instance details

Defined in Amazonka.EC2.Types.IamInstanceProfileAssociationState

Show IamInstanceProfileSpecification 
Instance details

Defined in Amazonka.EC2.Types.IamInstanceProfileSpecification

Show IcmpTypeCode 
Instance details

Defined in Amazonka.EC2.Types.IcmpTypeCode

Show IdFormat 
Instance details

Defined in Amazonka.EC2.Types.IdFormat

Show Igmpv2SupportValue 
Instance details

Defined in Amazonka.EC2.Types.Igmpv2SupportValue

Show Image 
Instance details

Defined in Amazonka.EC2.Types.Image

Methods

showsPrec :: Int -> Image -> ShowS #

show :: Image -> String #

showList :: [Image] -> ShowS #

Show ImageAttributeName 
Instance details

Defined in Amazonka.EC2.Types.ImageAttributeName

Show ImageDiskContainer 
Instance details

Defined in Amazonka.EC2.Types.ImageDiskContainer

Show ImageRecycleBinInfo 
Instance details

Defined in Amazonka.EC2.Types.ImageRecycleBinInfo

Show ImageState 
Instance details

Defined in Amazonka.EC2.Types.ImageState

Show ImageTypeValues 
Instance details

Defined in Amazonka.EC2.Types.ImageTypeValues

Show ImdsSupportValues 
Instance details

Defined in Amazonka.EC2.Types.ImdsSupportValues

Show ImportImageLicenseConfigurationRequest 
Instance details

Defined in Amazonka.EC2.Types.ImportImageLicenseConfigurationRequest

Show ImportImageLicenseConfigurationResponse 
Instance details

Defined in Amazonka.EC2.Types.ImportImageLicenseConfigurationResponse

Show ImportImageTask 
Instance details

Defined in Amazonka.EC2.Types.ImportImageTask

Show ImportInstanceLaunchSpecification 
Instance details

Defined in Amazonka.EC2.Types.ImportInstanceLaunchSpecification

Show ImportInstanceTaskDetails 
Instance details

Defined in Amazonka.EC2.Types.ImportInstanceTaskDetails

Show ImportInstanceVolumeDetailItem 
Instance details

Defined in Amazonka.EC2.Types.ImportInstanceVolumeDetailItem

Show ImportSnapshotTask 
Instance details

Defined in Amazonka.EC2.Types.ImportSnapshotTask

Show ImportVolumeTaskDetails 
Instance details

Defined in Amazonka.EC2.Types.ImportVolumeTaskDetails

Show InferenceAcceleratorInfo 
Instance details

Defined in Amazonka.EC2.Types.InferenceAcceleratorInfo

Show InferenceDeviceInfo 
Instance details

Defined in Amazonka.EC2.Types.InferenceDeviceInfo

Show Instance 
Instance details

Defined in Amazonka.EC2.Types.Instance

Show InstanceAttributeName 
Instance details

Defined in Amazonka.EC2.Types.InstanceAttributeName

Show InstanceAutoRecoveryState 
Instance details

Defined in Amazonka.EC2.Types.InstanceAutoRecoveryState

Show InstanceBlockDeviceMapping 
Instance details

Defined in Amazonka.EC2.Types.InstanceBlockDeviceMapping

Show InstanceBlockDeviceMappingSpecification 
Instance details

Defined in Amazonka.EC2.Types.InstanceBlockDeviceMappingSpecification

Show InstanceCapacity 
Instance details

Defined in Amazonka.EC2.Types.InstanceCapacity

Show InstanceCount 
Instance details

Defined in Amazonka.EC2.Types.InstanceCount

Show InstanceCreditSpecification 
Instance details

Defined in Amazonka.EC2.Types.InstanceCreditSpecification

Show InstanceCreditSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceCreditSpecificationRequest

Show InstanceEventWindow 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindow

Show InstanceEventWindowAssociationRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindowAssociationRequest

Show InstanceEventWindowAssociationTarget 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindowAssociationTarget

Show InstanceEventWindowDisassociationRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindowDisassociationRequest

Show InstanceEventWindowState 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindowState

Show InstanceEventWindowStateChange 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindowStateChange

Show InstanceEventWindowTimeRange 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindowTimeRange

Show InstanceEventWindowTimeRangeRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindowTimeRangeRequest

Show InstanceExportDetails 
Instance details

Defined in Amazonka.EC2.Types.InstanceExportDetails

Show InstanceFamilyCreditSpecification 
Instance details

Defined in Amazonka.EC2.Types.InstanceFamilyCreditSpecification

Show InstanceGeneration 
Instance details

Defined in Amazonka.EC2.Types.InstanceGeneration

Show InstanceHealthStatus 
Instance details

Defined in Amazonka.EC2.Types.InstanceHealthStatus

Show InstanceInterruptionBehavior 
Instance details

Defined in Amazonka.EC2.Types.InstanceInterruptionBehavior

Show InstanceIpv4Prefix 
Instance details

Defined in Amazonka.EC2.Types.InstanceIpv4Prefix

Show InstanceIpv6Address 
Instance details

Defined in Amazonka.EC2.Types.InstanceIpv6Address

Show InstanceIpv6AddressRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceIpv6AddressRequest

Show InstanceIpv6Prefix 
Instance details

Defined in Amazonka.EC2.Types.InstanceIpv6Prefix

Show InstanceLifecycle 
Instance details

Defined in Amazonka.EC2.Types.InstanceLifecycle

Show InstanceLifecycleType 
Instance details

Defined in Amazonka.EC2.Types.InstanceLifecycleType

Show InstanceMaintenanceOptions 
Instance details

Defined in Amazonka.EC2.Types.InstanceMaintenanceOptions

Show InstanceMaintenanceOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceMaintenanceOptionsRequest

Show InstanceMarketOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceMarketOptionsRequest

Show InstanceMatchCriteria 
Instance details

Defined in Amazonka.EC2.Types.InstanceMatchCriteria

Show InstanceMetadataEndpointState 
Instance details

Defined in Amazonka.EC2.Types.InstanceMetadataEndpointState

Show InstanceMetadataOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceMetadataOptionsRequest

Show InstanceMetadataOptionsResponse 
Instance details

Defined in Amazonka.EC2.Types.InstanceMetadataOptionsResponse

Show InstanceMetadataOptionsState 
Instance details

Defined in Amazonka.EC2.Types.InstanceMetadataOptionsState

Show InstanceMetadataProtocolState 
Instance details

Defined in Amazonka.EC2.Types.InstanceMetadataProtocolState

Show InstanceMetadataTagsState 
Instance details

Defined in Amazonka.EC2.Types.InstanceMetadataTagsState

Show InstanceMonitoring 
Instance details

Defined in Amazonka.EC2.Types.InstanceMonitoring

Show InstanceNetworkInterface 
Instance details

Defined in Amazonka.EC2.Types.InstanceNetworkInterface

Show InstanceNetworkInterfaceAssociation 
Instance details

Defined in Amazonka.EC2.Types.InstanceNetworkInterfaceAssociation

Show InstanceNetworkInterfaceAttachment 
Instance details

Defined in Amazonka.EC2.Types.InstanceNetworkInterfaceAttachment

Show InstanceNetworkInterfaceSpecification 
Instance details

Defined in Amazonka.EC2.Types.InstanceNetworkInterfaceSpecification

Show InstancePrivateIpAddress 
Instance details

Defined in Amazonka.EC2.Types.InstancePrivateIpAddress

Show InstanceRequirements 
Instance details

Defined in Amazonka.EC2.Types.InstanceRequirements

Show InstanceRequirementsRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceRequirementsRequest

Show InstanceRequirementsWithMetadataRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceRequirementsWithMetadataRequest

Show InstanceSpecification 
Instance details

Defined in Amazonka.EC2.Types.InstanceSpecification

Show InstanceState 
Instance details

Defined in Amazonka.EC2.Types.InstanceState

Show InstanceStateChange 
Instance details

Defined in Amazonka.EC2.Types.InstanceStateChange

Show InstanceStateName 
Instance details

Defined in Amazonka.EC2.Types.InstanceStateName

Show InstanceStatus 
Instance details

Defined in Amazonka.EC2.Types.InstanceStatus

Show InstanceStatusDetails 
Instance details

Defined in Amazonka.EC2.Types.InstanceStatusDetails

Show InstanceStatusEvent 
Instance details

Defined in Amazonka.EC2.Types.InstanceStatusEvent

Show InstanceStatusSummary 
Instance details

Defined in Amazonka.EC2.Types.InstanceStatusSummary

Show InstanceStorageEncryptionSupport 
Instance details

Defined in Amazonka.EC2.Types.InstanceStorageEncryptionSupport

Show InstanceStorageInfo 
Instance details

Defined in Amazonka.EC2.Types.InstanceStorageInfo

Show InstanceTagNotificationAttribute 
Instance details

Defined in Amazonka.EC2.Types.InstanceTagNotificationAttribute

Show InstanceType 
Instance details

Defined in Amazonka.EC2.Types.InstanceType

Show InstanceTypeHypervisor 
Instance details

Defined in Amazonka.EC2.Types.InstanceTypeHypervisor

Show InstanceTypeInfo 
Instance details

Defined in Amazonka.EC2.Types.InstanceTypeInfo

Show InstanceTypeInfoFromInstanceRequirements 
Instance details

Defined in Amazonka.EC2.Types.InstanceTypeInfoFromInstanceRequirements

Show InstanceTypeOffering 
Instance details

Defined in Amazonka.EC2.Types.InstanceTypeOffering

Show InstanceUsage 
Instance details

Defined in Amazonka.EC2.Types.InstanceUsage

Show IntegrateServices 
Instance details

Defined in Amazonka.EC2.Types.IntegrateServices

Show InterfacePermissionType 
Instance details

Defined in Amazonka.EC2.Types.InterfacePermissionType

Show InterfaceProtocolType 
Instance details

Defined in Amazonka.EC2.Types.InterfaceProtocolType

Show InternetGateway 
Instance details

Defined in Amazonka.EC2.Types.InternetGateway

Show InternetGatewayAttachment 
Instance details

Defined in Amazonka.EC2.Types.InternetGatewayAttachment

Show IpAddressType 
Instance details

Defined in Amazonka.EC2.Types.IpAddressType

Show IpPermission 
Instance details

Defined in Amazonka.EC2.Types.IpPermission

Show IpRange 
Instance details

Defined in Amazonka.EC2.Types.IpRange

Show Ipam 
Instance details

Defined in Amazonka.EC2.Types.Ipam

Methods

showsPrec :: Int -> Ipam -> ShowS #

show :: Ipam -> String #

showList :: [Ipam] -> ShowS #

Show IpamAddressHistoryRecord 
Instance details

Defined in Amazonka.EC2.Types.IpamAddressHistoryRecord

Show IpamAddressHistoryResourceType 
Instance details

Defined in Amazonka.EC2.Types.IpamAddressHistoryResourceType

Show IpamCidrAuthorizationContext 
Instance details

Defined in Amazonka.EC2.Types.IpamCidrAuthorizationContext

Show IpamComplianceStatus 
Instance details

Defined in Amazonka.EC2.Types.IpamComplianceStatus

Show IpamManagementState 
Instance details

Defined in Amazonka.EC2.Types.IpamManagementState

Show IpamOperatingRegion 
Instance details

Defined in Amazonka.EC2.Types.IpamOperatingRegion

Show IpamOverlapStatus 
Instance details

Defined in Amazonka.EC2.Types.IpamOverlapStatus

Show IpamPool 
Instance details

Defined in Amazonka.EC2.Types.IpamPool

Show IpamPoolAllocation 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolAllocation

Show IpamPoolAllocationResourceType 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolAllocationResourceType

Show IpamPoolAwsService 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolAwsService

Show IpamPoolCidr 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolCidr

Show IpamPoolCidrFailureCode 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolCidrFailureCode

Show IpamPoolCidrFailureReason 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolCidrFailureReason

Show IpamPoolCidrState 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolCidrState

Show IpamPoolState 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolState

Show IpamResourceCidr 
Instance details

Defined in Amazonka.EC2.Types.IpamResourceCidr

Show IpamResourceTag 
Instance details

Defined in Amazonka.EC2.Types.IpamResourceTag

Show IpamResourceType 
Instance details

Defined in Amazonka.EC2.Types.IpamResourceType

Show IpamScope 
Instance details

Defined in Amazonka.EC2.Types.IpamScope

Show IpamScopeState 
Instance details

Defined in Amazonka.EC2.Types.IpamScopeState

Show IpamScopeType 
Instance details

Defined in Amazonka.EC2.Types.IpamScopeType

Show IpamState 
Instance details

Defined in Amazonka.EC2.Types.IpamState

Show Ipv4PrefixSpecification 
Instance details

Defined in Amazonka.EC2.Types.Ipv4PrefixSpecification

Show Ipv4PrefixSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.Ipv4PrefixSpecificationRequest

Show Ipv4PrefixSpecificationResponse 
Instance details

Defined in Amazonka.EC2.Types.Ipv4PrefixSpecificationResponse

Show Ipv6CidrAssociation 
Instance details

Defined in Amazonka.EC2.Types.Ipv6CidrAssociation

Show Ipv6CidrBlock 
Instance details

Defined in Amazonka.EC2.Types.Ipv6CidrBlock

Show Ipv6Pool 
Instance details

Defined in Amazonka.EC2.Types.Ipv6Pool

Show Ipv6PrefixSpecification 
Instance details

Defined in Amazonka.EC2.Types.Ipv6PrefixSpecification

Show Ipv6PrefixSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.Ipv6PrefixSpecificationRequest

Show Ipv6PrefixSpecificationResponse 
Instance details

Defined in Amazonka.EC2.Types.Ipv6PrefixSpecificationResponse

Show Ipv6Range 
Instance details

Defined in Amazonka.EC2.Types.Ipv6Range

Show Ipv6SupportValue 
Instance details

Defined in Amazonka.EC2.Types.Ipv6SupportValue

Show KeyFormat 
Instance details

Defined in Amazonka.EC2.Types.KeyFormat

Show KeyPairInfo 
Instance details

Defined in Amazonka.EC2.Types.KeyPairInfo

Show KeyType 
Instance details

Defined in Amazonka.EC2.Types.KeyType

Show LastError 
Instance details

Defined in Amazonka.EC2.Types.LastError

Show LaunchPermission 
Instance details

Defined in Amazonka.EC2.Types.LaunchPermission

Show LaunchPermissionModifications 
Instance details

Defined in Amazonka.EC2.Types.LaunchPermissionModifications

Show LaunchSpecification 
Instance details

Defined in Amazonka.EC2.Types.LaunchSpecification

Show LaunchTemplate 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplate

Show LaunchTemplateAndOverridesResponse 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateAndOverridesResponse

Show LaunchTemplateAutoRecoveryState 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateAutoRecoveryState

Show LaunchTemplateBlockDeviceMapping 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateBlockDeviceMapping

Show LaunchTemplateBlockDeviceMappingRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateBlockDeviceMappingRequest

Show LaunchTemplateCapacityReservationSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateCapacityReservationSpecificationRequest

Show LaunchTemplateCapacityReservationSpecificationResponse 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateCapacityReservationSpecificationResponse

Show LaunchTemplateConfig 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateConfig

Show LaunchTemplateCpuOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateCpuOptions

Show LaunchTemplateCpuOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateCpuOptionsRequest

Show LaunchTemplateEbsBlockDevice 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateEbsBlockDevice

Show LaunchTemplateEbsBlockDeviceRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateEbsBlockDeviceRequest

Show LaunchTemplateElasticInferenceAccelerator 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateElasticInferenceAccelerator

Show LaunchTemplateElasticInferenceAcceleratorResponse 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateElasticInferenceAcceleratorResponse

Show LaunchTemplateEnclaveOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateEnclaveOptions

Show LaunchTemplateEnclaveOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateEnclaveOptionsRequest

Show LaunchTemplateErrorCode 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateErrorCode

Show LaunchTemplateHibernationOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateHibernationOptions

Show LaunchTemplateHibernationOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateHibernationOptionsRequest

Show LaunchTemplateHttpTokensState 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateHttpTokensState

Show LaunchTemplateIamInstanceProfileSpecification 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateIamInstanceProfileSpecification

Show LaunchTemplateIamInstanceProfileSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateIamInstanceProfileSpecificationRequest

Show LaunchTemplateInstanceMaintenanceOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMaintenanceOptions

Show LaunchTemplateInstanceMaintenanceOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMaintenanceOptionsRequest

Show LaunchTemplateInstanceMarketOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMarketOptions

Show LaunchTemplateInstanceMarketOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMarketOptionsRequest

Show LaunchTemplateInstanceMetadataEndpointState 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMetadataEndpointState

Show LaunchTemplateInstanceMetadataOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMetadataOptions

Show LaunchTemplateInstanceMetadataOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMetadataOptionsRequest

Show LaunchTemplateInstanceMetadataOptionsState 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMetadataOptionsState

Show LaunchTemplateInstanceMetadataProtocolIpv6 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMetadataProtocolIpv6

Show LaunchTemplateInstanceMetadataTagsState 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMetadataTagsState

Show LaunchTemplateInstanceNetworkInterfaceSpecification 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceNetworkInterfaceSpecification

Show LaunchTemplateInstanceNetworkInterfaceSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceNetworkInterfaceSpecificationRequest

Show LaunchTemplateLicenseConfiguration 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateLicenseConfiguration

Show LaunchTemplateLicenseConfigurationRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateLicenseConfigurationRequest

Show LaunchTemplateOverrides 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateOverrides

Show LaunchTemplatePlacement 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplatePlacement

Show LaunchTemplatePlacementRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplatePlacementRequest

Show LaunchTemplatePrivateDnsNameOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplatePrivateDnsNameOptions

Show LaunchTemplatePrivateDnsNameOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplatePrivateDnsNameOptionsRequest

Show LaunchTemplateSpecification 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateSpecification

Show LaunchTemplateSpotMarketOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateSpotMarketOptions

Show LaunchTemplateSpotMarketOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateSpotMarketOptionsRequest

Show LaunchTemplateTagSpecification 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateTagSpecification

Show LaunchTemplateTagSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateTagSpecificationRequest

Show LaunchTemplateVersion 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateVersion

Show LaunchTemplatesMonitoring 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplatesMonitoring

Show LaunchTemplatesMonitoringRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplatesMonitoringRequest

Show LicenseConfiguration 
Instance details

Defined in Amazonka.EC2.Types.LicenseConfiguration

Show LicenseConfigurationRequest 
Instance details

Defined in Amazonka.EC2.Types.LicenseConfigurationRequest

Show ListingState 
Instance details

Defined in Amazonka.EC2.Types.ListingState

Show ListingStatus 
Instance details

Defined in Amazonka.EC2.Types.ListingStatus

Show LoadBalancersConfig 
Instance details

Defined in Amazonka.EC2.Types.LoadBalancersConfig

Show LoadPermission 
Instance details

Defined in Amazonka.EC2.Types.LoadPermission

Show LoadPermissionModifications 
Instance details

Defined in Amazonka.EC2.Types.LoadPermissionModifications

Show LoadPermissionRequest 
Instance details

Defined in Amazonka.EC2.Types.LoadPermissionRequest

Show LocalGateway 
Instance details

Defined in Amazonka.EC2.Types.LocalGateway

Show LocalGatewayRoute 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRoute

Show LocalGatewayRouteState 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRouteState

Show LocalGatewayRouteTable 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRouteTable

Show LocalGatewayRouteTableMode 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRouteTableMode

Show LocalGatewayRouteTableVirtualInterfaceGroupAssociation 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRouteTableVirtualInterfaceGroupAssociation

Show LocalGatewayRouteTableVpcAssociation 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRouteTableVpcAssociation

Show LocalGatewayRouteType 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRouteType

Show LocalGatewayVirtualInterface 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayVirtualInterface

Show LocalGatewayVirtualInterfaceGroup 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayVirtualInterfaceGroup

Show LocalStorage 
Instance details

Defined in Amazonka.EC2.Types.LocalStorage

Show LocalStorageType 
Instance details

Defined in Amazonka.EC2.Types.LocalStorageType

Show LocationType 
Instance details

Defined in Amazonka.EC2.Types.LocationType

Show LogDestinationType 
Instance details

Defined in Amazonka.EC2.Types.LogDestinationType

Show ManagedPrefixList 
Instance details

Defined in Amazonka.EC2.Types.ManagedPrefixList

Show MarketType 
Instance details

Defined in Amazonka.EC2.Types.MarketType

Show MembershipType 
Instance details

Defined in Amazonka.EC2.Types.MembershipType

Show MemoryGiBPerVCpu 
Instance details

Defined in Amazonka.EC2.Types.MemoryGiBPerVCpu

Show MemoryGiBPerVCpuRequest 
Instance details

Defined in Amazonka.EC2.Types.MemoryGiBPerVCpuRequest

Show MemoryInfo 
Instance details

Defined in Amazonka.EC2.Types.MemoryInfo

Show MemoryMiB 
Instance details

Defined in Amazonka.EC2.Types.MemoryMiB

Show MemoryMiBRequest 
Instance details

Defined in Amazonka.EC2.Types.MemoryMiBRequest

Show MetricPoint 
Instance details

Defined in Amazonka.EC2.Types.MetricPoint

Show MetricType 
Instance details

Defined in Amazonka.EC2.Types.MetricType

Show ModifyAvailabilityZoneOptInStatus 
Instance details

Defined in Amazonka.EC2.Types.ModifyAvailabilityZoneOptInStatus

Show ModifyTransitGatewayOptions 
Instance details

Defined in Amazonka.EC2.Types.ModifyTransitGatewayOptions

Show ModifyTransitGatewayVpcAttachmentRequestOptions 
Instance details

Defined in Amazonka.EC2.Types.ModifyTransitGatewayVpcAttachmentRequestOptions

Show ModifyVerifiedAccessEndpointEniOptions 
Instance details

Defined in Amazonka.EC2.Types.ModifyVerifiedAccessEndpointEniOptions

Show ModifyVerifiedAccessEndpointLoadBalancerOptions 
Instance details

Defined in Amazonka.EC2.Types.ModifyVerifiedAccessEndpointLoadBalancerOptions

Show ModifyVerifiedAccessTrustProviderOidcOptions 
Instance details

Defined in Amazonka.EC2.Types.ModifyVerifiedAccessTrustProviderOidcOptions

Show ModifyVpnTunnelOptionsSpecification 
Instance details

Defined in Amazonka.EC2.Types.ModifyVpnTunnelOptionsSpecification

Show Monitoring 
Instance details

Defined in Amazonka.EC2.Types.Monitoring

Show MonitoringState 
Instance details

Defined in Amazonka.EC2.Types.MonitoringState

Show MoveStatus 
Instance details

Defined in Amazonka.EC2.Types.MoveStatus

Show MovingAddressStatus 
Instance details

Defined in Amazonka.EC2.Types.MovingAddressStatus

Show MulticastSupportValue 
Instance details

Defined in Amazonka.EC2.Types.MulticastSupportValue

Show NatGateway 
Instance details

Defined in Amazonka.EC2.Types.NatGateway

Show NatGatewayAddress 
Instance details

Defined in Amazonka.EC2.Types.NatGatewayAddress

Show NatGatewayState 
Instance details

Defined in Amazonka.EC2.Types.NatGatewayState

Show NetworkAcl 
Instance details

Defined in Amazonka.EC2.Types.NetworkAcl

Show NetworkAclAssociation 
Instance details

Defined in Amazonka.EC2.Types.NetworkAclAssociation

Show NetworkAclEntry 
Instance details

Defined in Amazonka.EC2.Types.NetworkAclEntry

Show NetworkBandwidthGbps 
Instance details

Defined in Amazonka.EC2.Types.NetworkBandwidthGbps

Show NetworkBandwidthGbpsRequest 
Instance details

Defined in Amazonka.EC2.Types.NetworkBandwidthGbpsRequest

Show NetworkCardInfo 
Instance details

Defined in Amazonka.EC2.Types.NetworkCardInfo

Show NetworkInfo 
Instance details

Defined in Amazonka.EC2.Types.NetworkInfo

Show NetworkInsightsAccessScope 
Instance details

Defined in Amazonka.EC2.Types.NetworkInsightsAccessScope

Show NetworkInsightsAccessScopeAnalysis 
Instance details

Defined in Amazonka.EC2.Types.NetworkInsightsAccessScopeAnalysis

Show NetworkInsightsAccessScopeContent 
Instance details

Defined in Amazonka.EC2.Types.NetworkInsightsAccessScopeContent

Show NetworkInsightsAnalysis 
Instance details

Defined in Amazonka.EC2.Types.NetworkInsightsAnalysis

Show NetworkInsightsPath 
Instance details

Defined in Amazonka.EC2.Types.NetworkInsightsPath

Show NetworkInterface 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterface

Show NetworkInterfaceAssociation 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceAssociation

Show NetworkInterfaceAttachment 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceAttachment

Show NetworkInterfaceAttachmentChanges 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceAttachmentChanges

Show NetworkInterfaceAttribute 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceAttribute

Show NetworkInterfaceCount 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceCount

Show NetworkInterfaceCountRequest 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceCountRequest

Show NetworkInterfaceCreationType 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceCreationType

Show NetworkInterfaceIpv6Address 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceIpv6Address

Show NetworkInterfacePermission 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfacePermission

Show NetworkInterfacePermissionState 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfacePermissionState

Show NetworkInterfacePermissionStateCode 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfacePermissionStateCode

Show NetworkInterfacePrivateIpAddress 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfacePrivateIpAddress

Show NetworkInterfaceStatus 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceStatus

Show NetworkInterfaceType 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceType

Show NewDhcpConfiguration 
Instance details

Defined in Amazonka.EC2.Types.NewDhcpConfiguration

Show OfferingClassType 
Instance details

Defined in Amazonka.EC2.Types.OfferingClassType

Show OfferingTypeValues 
Instance details

Defined in Amazonka.EC2.Types.OfferingTypeValues

Show OidcOptions 
Instance details

Defined in Amazonka.EC2.Types.OidcOptions

Show OnDemandAllocationStrategy 
Instance details

Defined in Amazonka.EC2.Types.OnDemandAllocationStrategy

Show OnDemandOptions 
Instance details

Defined in Amazonka.EC2.Types.OnDemandOptions

Show OnDemandOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.OnDemandOptionsRequest

Show OperationType 
Instance details

Defined in Amazonka.EC2.Types.OperationType

Show PacketHeaderStatement 
Instance details

Defined in Amazonka.EC2.Types.PacketHeaderStatement

Show PacketHeaderStatementRequest 
Instance details

Defined in Amazonka.EC2.Types.PacketHeaderStatementRequest

Show PartitionLoadFrequency 
Instance details

Defined in Amazonka.EC2.Types.PartitionLoadFrequency

Show PathComponent 
Instance details

Defined in Amazonka.EC2.Types.PathComponent

Show PathStatement 
Instance details

Defined in Amazonka.EC2.Types.PathStatement

Show PathStatementRequest 
Instance details

Defined in Amazonka.EC2.Types.PathStatementRequest

Show PayerResponsibility 
Instance details

Defined in Amazonka.EC2.Types.PayerResponsibility

Show PaymentOption 
Instance details

Defined in Amazonka.EC2.Types.PaymentOption

Show PciId 
Instance details

Defined in Amazonka.EC2.Types.PciId

Methods

showsPrec :: Int -> PciId -> ShowS #

show :: PciId -> String #

showList :: [PciId] -> ShowS #

Show PeeringAttachmentStatus 
Instance details

Defined in Amazonka.EC2.Types.PeeringAttachmentStatus

Show PeeringConnectionOptions 
Instance details

Defined in Amazonka.EC2.Types.PeeringConnectionOptions

Show PeeringConnectionOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.PeeringConnectionOptionsRequest

Show PeeringTgwInfo 
Instance details

Defined in Amazonka.EC2.Types.PeeringTgwInfo

Show PeriodType 
Instance details

Defined in Amazonka.EC2.Types.PeriodType

Show PermissionGroup 
Instance details

Defined in Amazonka.EC2.Types.PermissionGroup

Show Phase1DHGroupNumbersListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase1DHGroupNumbersListValue

Show Phase1DHGroupNumbersRequestListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase1DHGroupNumbersRequestListValue

Show Phase1EncryptionAlgorithmsListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase1EncryptionAlgorithmsListValue

Show Phase1EncryptionAlgorithmsRequestListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase1EncryptionAlgorithmsRequestListValue

Show Phase1IntegrityAlgorithmsListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase1IntegrityAlgorithmsListValue

Show Phase1IntegrityAlgorithmsRequestListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase1IntegrityAlgorithmsRequestListValue

Show Phase2DHGroupNumbersListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase2DHGroupNumbersListValue

Show Phase2DHGroupNumbersRequestListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase2DHGroupNumbersRequestListValue

Show Phase2EncryptionAlgorithmsListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase2EncryptionAlgorithmsListValue

Show Phase2EncryptionAlgorithmsRequestListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase2EncryptionAlgorithmsRequestListValue

Show Phase2IntegrityAlgorithmsListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase2IntegrityAlgorithmsListValue

Show Phase2IntegrityAlgorithmsRequestListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase2IntegrityAlgorithmsRequestListValue

Show Placement 
Instance details

Defined in Amazonka.EC2.Types.Placement

Show PlacementGroup 
Instance details

Defined in Amazonka.EC2.Types.PlacementGroup

Show PlacementGroupInfo 
Instance details

Defined in Amazonka.EC2.Types.PlacementGroupInfo

Show PlacementGroupState 
Instance details

Defined in Amazonka.EC2.Types.PlacementGroupState

Show PlacementGroupStrategy 
Instance details

Defined in Amazonka.EC2.Types.PlacementGroupStrategy

Show PlacementResponse 
Instance details

Defined in Amazonka.EC2.Types.PlacementResponse

Show PlacementStrategy 
Instance details

Defined in Amazonka.EC2.Types.PlacementStrategy

Show PlatformValues 
Instance details

Defined in Amazonka.EC2.Types.PlatformValues

Show PoolCidrBlock 
Instance details

Defined in Amazonka.EC2.Types.PoolCidrBlock

Show PortRange 
Instance details

Defined in Amazonka.EC2.Types.PortRange

Show PrefixList 
Instance details

Defined in Amazonka.EC2.Types.PrefixList

Show PrefixListAssociation 
Instance details

Defined in Amazonka.EC2.Types.PrefixListAssociation

Show PrefixListEntry 
Instance details

Defined in Amazonka.EC2.Types.PrefixListEntry

Show PrefixListId 
Instance details

Defined in Amazonka.EC2.Types.PrefixListId

Show PrefixListState 
Instance details

Defined in Amazonka.EC2.Types.PrefixListState

Show PriceSchedule 
Instance details

Defined in Amazonka.EC2.Types.PriceSchedule

Show PriceScheduleSpecification 
Instance details

Defined in Amazonka.EC2.Types.PriceScheduleSpecification

Show PricingDetail 
Instance details

Defined in Amazonka.EC2.Types.PricingDetail

Show PrincipalIdFormat 
Instance details

Defined in Amazonka.EC2.Types.PrincipalIdFormat

Show PrincipalType 
Instance details

Defined in Amazonka.EC2.Types.PrincipalType

Show PrivateDnsDetails 
Instance details

Defined in Amazonka.EC2.Types.PrivateDnsDetails

Show PrivateDnsNameConfiguration 
Instance details

Defined in Amazonka.EC2.Types.PrivateDnsNameConfiguration

Show PrivateDnsNameOptionsOnLaunch 
Instance details

Defined in Amazonka.EC2.Types.PrivateDnsNameOptionsOnLaunch

Show PrivateDnsNameOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.PrivateDnsNameOptionsRequest

Show PrivateDnsNameOptionsResponse 
Instance details

Defined in Amazonka.EC2.Types.PrivateDnsNameOptionsResponse

Show PrivateIpAddressSpecification 
Instance details

Defined in Amazonka.EC2.Types.PrivateIpAddressSpecification

Show ProcessorInfo 
Instance details

Defined in Amazonka.EC2.Types.ProcessorInfo

Show ProductCode 
Instance details

Defined in Amazonka.EC2.Types.ProductCode

Show ProductCodeValues 
Instance details

Defined in Amazonka.EC2.Types.ProductCodeValues

Show PropagatingVgw 
Instance details

Defined in Amazonka.EC2.Types.PropagatingVgw

Show Protocol 
Instance details

Defined in Amazonka.EC2.Types.Protocol

Show ProtocolValue 
Instance details

Defined in Amazonka.EC2.Types.ProtocolValue

Show ProvisionedBandwidth 
Instance details

Defined in Amazonka.EC2.Types.ProvisionedBandwidth

Show PtrUpdateStatus 
Instance details

Defined in Amazonka.EC2.Types.PtrUpdateStatus

Show PublicIpv4Pool 
Instance details

Defined in Amazonka.EC2.Types.PublicIpv4Pool

Show PublicIpv4PoolRange 
Instance details

Defined in Amazonka.EC2.Types.PublicIpv4PoolRange

Show Purchase 
Instance details

Defined in Amazonka.EC2.Types.Purchase

Show PurchaseRequest 
Instance details

Defined in Amazonka.EC2.Types.PurchaseRequest

Show RIProductDescription 
Instance details

Defined in Amazonka.EC2.Types.RIProductDescription

Show RecurringCharge 
Instance details

Defined in Amazonka.EC2.Types.RecurringCharge

Show RecurringChargeFrequency 
Instance details

Defined in Amazonka.EC2.Types.RecurringChargeFrequency

Show ReferencedSecurityGroup 
Instance details

Defined in Amazonka.EC2.Types.ReferencedSecurityGroup

Show RegionInfo 
Instance details

Defined in Amazonka.EC2.Types.RegionInfo

Show RegisterInstanceTagAttributeRequest 
Instance details

Defined in Amazonka.EC2.Types.RegisterInstanceTagAttributeRequest

Show RemoveIpamOperatingRegion 
Instance details

Defined in Amazonka.EC2.Types.RemoveIpamOperatingRegion

Show RemovePrefixListEntry 
Instance details

Defined in Amazonka.EC2.Types.RemovePrefixListEntry

Show ReplaceRootVolumeTask 
Instance details

Defined in Amazonka.EC2.Types.ReplaceRootVolumeTask

Show ReplaceRootVolumeTaskState 
Instance details

Defined in Amazonka.EC2.Types.ReplaceRootVolumeTaskState

Show ReplacementStrategy 
Instance details

Defined in Amazonka.EC2.Types.ReplacementStrategy

Show ReportInstanceReasonCodes 
Instance details

Defined in Amazonka.EC2.Types.ReportInstanceReasonCodes

Show ReportStatusType 
Instance details

Defined in Amazonka.EC2.Types.ReportStatusType

Show RequestIpamResourceTag 
Instance details

Defined in Amazonka.EC2.Types.RequestIpamResourceTag

Show RequestLaunchTemplateData 
Instance details

Defined in Amazonka.EC2.Types.RequestLaunchTemplateData

Show RequestSpotLaunchSpecification 
Instance details

Defined in Amazonka.EC2.Types.RequestSpotLaunchSpecification

Show Reservation 
Instance details

Defined in Amazonka.EC2.Types.Reservation

Show ReservationFleetInstanceSpecification 
Instance details

Defined in Amazonka.EC2.Types.ReservationFleetInstanceSpecification

Show ReservationState 
Instance details

Defined in Amazonka.EC2.Types.ReservationState

Show ReservationValue 
Instance details

Defined in Amazonka.EC2.Types.ReservationValue

Show ReservedInstanceLimitPrice 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstanceLimitPrice

Show ReservedInstanceReservationValue 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstanceReservationValue

Show ReservedInstanceState 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstanceState

Show ReservedInstances 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstances

Show ReservedInstancesConfiguration 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstancesConfiguration

Show ReservedInstancesId 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstancesId

Show ReservedInstancesListing 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstancesListing

Show ReservedInstancesModification 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstancesModification

Show ReservedInstancesModificationResult 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstancesModificationResult

Show ReservedInstancesOffering 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstancesOffering

Show ResetFpgaImageAttributeName 
Instance details

Defined in Amazonka.EC2.Types.ResetFpgaImageAttributeName

Show ResetImageAttributeName 
Instance details

Defined in Amazonka.EC2.Types.ResetImageAttributeName

Show ResourceStatement 
Instance details

Defined in Amazonka.EC2.Types.ResourceStatement

Show ResourceStatementRequest 
Instance details

Defined in Amazonka.EC2.Types.ResourceStatementRequest

Show ResourceType 
Instance details

Defined in Amazonka.EC2.Types.ResourceType

Show ResponseError 
Instance details

Defined in Amazonka.EC2.Types.ResponseError

Show ResponseLaunchTemplateData 
Instance details

Defined in Amazonka.EC2.Types.ResponseLaunchTemplateData

Show RootDeviceType 
Instance details

Defined in Amazonka.EC2.Types.RootDeviceType

Show Route 
Instance details

Defined in Amazonka.EC2.Types.Route

Methods

showsPrec :: Int -> Route -> ShowS #

show :: Route -> String #

showList :: [Route] -> ShowS #

Show RouteOrigin 
Instance details

Defined in Amazonka.EC2.Types.RouteOrigin

Show RouteState 
Instance details

Defined in Amazonka.EC2.Types.RouteState

Show RouteTable 
Instance details

Defined in Amazonka.EC2.Types.RouteTable

Show RouteTableAssociation 
Instance details

Defined in Amazonka.EC2.Types.RouteTableAssociation

Show RouteTableAssociationState 
Instance details

Defined in Amazonka.EC2.Types.RouteTableAssociationState

Show RouteTableAssociationStateCode 
Instance details

Defined in Amazonka.EC2.Types.RouteTableAssociationStateCode

Show RuleAction 
Instance details

Defined in Amazonka.EC2.Types.RuleAction

Show RunInstancesMonitoringEnabled 
Instance details

Defined in Amazonka.EC2.Types.RunInstancesMonitoringEnabled

Show S3ObjectTag 
Instance details

Defined in Amazonka.EC2.Types.S3ObjectTag

Show S3Storage 
Instance details

Defined in Amazonka.EC2.Types.S3Storage

Show ScheduledInstance 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstance

Show ScheduledInstanceAvailability 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstanceAvailability

Show ScheduledInstanceRecurrence 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstanceRecurrence

Show ScheduledInstanceRecurrenceRequest 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstanceRecurrenceRequest

Show ScheduledInstancesBlockDeviceMapping 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesBlockDeviceMapping

Show ScheduledInstancesEbs 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesEbs

Show ScheduledInstancesIamInstanceProfile 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesIamInstanceProfile

Show ScheduledInstancesIpv6Address 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesIpv6Address

Show ScheduledInstancesLaunchSpecification 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesLaunchSpecification

Show ScheduledInstancesMonitoring 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesMonitoring

Show ScheduledInstancesNetworkInterface 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesNetworkInterface

Show ScheduledInstancesPlacement 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesPlacement

Show ScheduledInstancesPrivateIpAddressConfig 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesPrivateIpAddressConfig

Show Scope 
Instance details

Defined in Amazonka.EC2.Types.Scope

Methods

showsPrec :: Int -> Scope -> ShowS #

show :: Scope -> String #

showList :: [Scope] -> ShowS #

Show SecurityGroup 
Instance details

Defined in Amazonka.EC2.Types.SecurityGroup

Show SecurityGroupIdentifier 
Instance details

Defined in Amazonka.EC2.Types.SecurityGroupIdentifier

Show SecurityGroupReference 
Instance details

Defined in Amazonka.EC2.Types.SecurityGroupReference

Show SecurityGroupRule 
Instance details

Defined in Amazonka.EC2.Types.SecurityGroupRule

Show SecurityGroupRuleDescription 
Instance details

Defined in Amazonka.EC2.Types.SecurityGroupRuleDescription

Show SecurityGroupRuleRequest 
Instance details

Defined in Amazonka.EC2.Types.SecurityGroupRuleRequest

Show SecurityGroupRuleUpdate 
Instance details

Defined in Amazonka.EC2.Types.SecurityGroupRuleUpdate

Show SelfServicePortal 
Instance details

Defined in Amazonka.EC2.Types.SelfServicePortal

Show ServiceConfiguration 
Instance details

Defined in Amazonka.EC2.Types.ServiceConfiguration

Show ServiceConnectivityType 
Instance details

Defined in Amazonka.EC2.Types.ServiceConnectivityType

Show ServiceDetail 
Instance details

Defined in Amazonka.EC2.Types.ServiceDetail

Show ServiceState 
Instance details

Defined in Amazonka.EC2.Types.ServiceState

Show ServiceType 
Instance details

Defined in Amazonka.EC2.Types.ServiceType

Show ServiceTypeDetail 
Instance details

Defined in Amazonka.EC2.Types.ServiceTypeDetail

Show ShutdownBehavior 
Instance details

Defined in Amazonka.EC2.Types.ShutdownBehavior

Show SlotDateTimeRangeRequest 
Instance details

Defined in Amazonka.EC2.Types.SlotDateTimeRangeRequest

Show SlotStartTimeRangeRequest 
Instance details

Defined in Amazonka.EC2.Types.SlotStartTimeRangeRequest

Show Snapshot 
Instance details

Defined in Amazonka.EC2.Types.Snapshot

Show SnapshotAttributeName 
Instance details

Defined in Amazonka.EC2.Types.SnapshotAttributeName

Show SnapshotDetail 
Instance details

Defined in Amazonka.EC2.Types.SnapshotDetail

Show SnapshotDiskContainer 
Instance details

Defined in Amazonka.EC2.Types.SnapshotDiskContainer

Show SnapshotInfo 
Instance details

Defined in Amazonka.EC2.Types.SnapshotInfo

Show SnapshotRecycleBinInfo 
Instance details

Defined in Amazonka.EC2.Types.SnapshotRecycleBinInfo

Show SnapshotState 
Instance details

Defined in Amazonka.EC2.Types.SnapshotState

Show SnapshotTaskDetail 
Instance details

Defined in Amazonka.EC2.Types.SnapshotTaskDetail

Show SnapshotTierStatus 
Instance details

Defined in Amazonka.EC2.Types.SnapshotTierStatus

Show SpotAllocationStrategy 
Instance details

Defined in Amazonka.EC2.Types.SpotAllocationStrategy

Show SpotCapacityRebalance 
Instance details

Defined in Amazonka.EC2.Types.SpotCapacityRebalance

Show SpotDatafeedSubscription 
Instance details

Defined in Amazonka.EC2.Types.SpotDatafeedSubscription

Show SpotFleetLaunchSpecification 
Instance details

Defined in Amazonka.EC2.Types.SpotFleetLaunchSpecification

Show SpotFleetMonitoring 
Instance details

Defined in Amazonka.EC2.Types.SpotFleetMonitoring

Show SpotFleetRequestConfig 
Instance details

Defined in Amazonka.EC2.Types.SpotFleetRequestConfig

Show SpotFleetRequestConfigData 
Instance details

Defined in Amazonka.EC2.Types.SpotFleetRequestConfigData

Show SpotFleetTagSpecification 
Instance details

Defined in Amazonka.EC2.Types.SpotFleetTagSpecification

Show SpotInstanceInterruptionBehavior 
Instance details

Defined in Amazonka.EC2.Types.SpotInstanceInterruptionBehavior

Show SpotInstanceRequest 
Instance details

Defined in Amazonka.EC2.Types.SpotInstanceRequest

Show SpotInstanceState 
Instance details

Defined in Amazonka.EC2.Types.SpotInstanceState

Show SpotInstanceStateFault 
Instance details

Defined in Amazonka.EC2.Types.SpotInstanceStateFault

Show SpotInstanceStatus 
Instance details

Defined in Amazonka.EC2.Types.SpotInstanceStatus

Show SpotInstanceType 
Instance details

Defined in Amazonka.EC2.Types.SpotInstanceType

Show SpotMaintenanceStrategies 
Instance details

Defined in Amazonka.EC2.Types.SpotMaintenanceStrategies

Show SpotMarketOptions 
Instance details

Defined in Amazonka.EC2.Types.SpotMarketOptions

Show SpotOptions 
Instance details

Defined in Amazonka.EC2.Types.SpotOptions

Show SpotOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.SpotOptionsRequest

Show SpotPlacement 
Instance details

Defined in Amazonka.EC2.Types.SpotPlacement

Show SpotPlacementScore 
Instance details

Defined in Amazonka.EC2.Types.SpotPlacementScore

Show SpotPrice 
Instance details

Defined in Amazonka.EC2.Types.SpotPrice

Show SpreadLevel 
Instance details

Defined in Amazonka.EC2.Types.SpreadLevel

Show StaleIpPermission 
Instance details

Defined in Amazonka.EC2.Types.StaleIpPermission

Show StaleSecurityGroup 
Instance details

Defined in Amazonka.EC2.Types.StaleSecurityGroup

Show State 
Instance details

Defined in Amazonka.EC2.Types.State

Methods

showsPrec :: Int -> State -> ShowS #

show :: State -> String #

showList :: [State] -> ShowS #

Show StateReason 
Instance details

Defined in Amazonka.EC2.Types.StateReason

Show StaticSourcesSupportValue 
Instance details

Defined in Amazonka.EC2.Types.StaticSourcesSupportValue

Show StatisticType 
Instance details

Defined in Amazonka.EC2.Types.StatisticType

Show StatusName 
Instance details

Defined in Amazonka.EC2.Types.StatusName

Show StatusType 
Instance details

Defined in Amazonka.EC2.Types.StatusType

Show Storage 
Instance details

Defined in Amazonka.EC2.Types.Storage

Show StorageLocation 
Instance details

Defined in Amazonka.EC2.Types.StorageLocation

Show StorageTier 
Instance details

Defined in Amazonka.EC2.Types.StorageTier

Show StoreImageTaskResult 
Instance details

Defined in Amazonka.EC2.Types.StoreImageTaskResult

Show Subnet 
Instance details

Defined in Amazonka.EC2.Types.Subnet

Show SubnetAssociation 
Instance details

Defined in Amazonka.EC2.Types.SubnetAssociation

Show SubnetCidrBlockState 
Instance details

Defined in Amazonka.EC2.Types.SubnetCidrBlockState

Show SubnetCidrBlockStateCode 
Instance details

Defined in Amazonka.EC2.Types.SubnetCidrBlockStateCode

Show SubnetCidrReservation 
Instance details

Defined in Amazonka.EC2.Types.SubnetCidrReservation

Show SubnetCidrReservationType 
Instance details

Defined in Amazonka.EC2.Types.SubnetCidrReservationType

Show SubnetIpv6CidrBlockAssociation 
Instance details

Defined in Amazonka.EC2.Types.SubnetIpv6CidrBlockAssociation

Show SubnetState 
Instance details

Defined in Amazonka.EC2.Types.SubnetState

Show Subscription 
Instance details

Defined in Amazonka.EC2.Types.Subscription

Show SuccessfulInstanceCreditSpecificationItem 
Instance details

Defined in Amazonka.EC2.Types.SuccessfulInstanceCreditSpecificationItem

Show SuccessfulQueuedPurchaseDeletion 
Instance details

Defined in Amazonka.EC2.Types.SuccessfulQueuedPurchaseDeletion

Show SummaryStatus 
Instance details

Defined in Amazonka.EC2.Types.SummaryStatus

Show Tag 
Instance details

Defined in Amazonka.EC2.Types.Tag

Methods

showsPrec :: Int -> Tag -> ShowS #

show :: Tag -> String #

showList :: [Tag] -> ShowS #

Show TagDescription 
Instance details

Defined in Amazonka.EC2.Types.TagDescription

Show TagSpecification 
Instance details

Defined in Amazonka.EC2.Types.TagSpecification

Show TargetCapacitySpecification 
Instance details

Defined in Amazonka.EC2.Types.TargetCapacitySpecification

Show TargetCapacitySpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.TargetCapacitySpecificationRequest

Show TargetCapacityUnitType 
Instance details

Defined in Amazonka.EC2.Types.TargetCapacityUnitType

Show TargetConfiguration 
Instance details

Defined in Amazonka.EC2.Types.TargetConfiguration

Show TargetConfigurationRequest 
Instance details

Defined in Amazonka.EC2.Types.TargetConfigurationRequest

Show TargetGroup 
Instance details

Defined in Amazonka.EC2.Types.TargetGroup

Show TargetGroupsConfig 
Instance details

Defined in Amazonka.EC2.Types.TargetGroupsConfig

Show TargetNetwork 
Instance details

Defined in Amazonka.EC2.Types.TargetNetwork

Show TargetReservationValue 
Instance details

Defined in Amazonka.EC2.Types.TargetReservationValue

Show TargetStorageTier 
Instance details

Defined in Amazonka.EC2.Types.TargetStorageTier

Show TelemetryStatus 
Instance details

Defined in Amazonka.EC2.Types.TelemetryStatus

Show Tenancy 
Instance details

Defined in Amazonka.EC2.Types.Tenancy

Show TerminateConnectionStatus 
Instance details

Defined in Amazonka.EC2.Types.TerminateConnectionStatus

Show ThroughResourcesStatement 
Instance details

Defined in Amazonka.EC2.Types.ThroughResourcesStatement

Show ThroughResourcesStatementRequest 
Instance details

Defined in Amazonka.EC2.Types.ThroughResourcesStatementRequest

Show TieringOperationStatus 
Instance details

Defined in Amazonka.EC2.Types.TieringOperationStatus

Show TotalLocalStorageGB 
Instance details

Defined in Amazonka.EC2.Types.TotalLocalStorageGB

Show TotalLocalStorageGBRequest 
Instance details

Defined in Amazonka.EC2.Types.TotalLocalStorageGBRequest

Show TpmSupportValues 
Instance details

Defined in Amazonka.EC2.Types.TpmSupportValues

Show TrafficDirection 
Instance details

Defined in Amazonka.EC2.Types.TrafficDirection

Show TrafficMirrorFilter 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorFilter

Show TrafficMirrorFilterRule 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorFilterRule

Show TrafficMirrorFilterRuleField 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorFilterRuleField

Show TrafficMirrorNetworkService 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorNetworkService

Show TrafficMirrorPortRange 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorPortRange

Show TrafficMirrorPortRangeRequest 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorPortRangeRequest

Show TrafficMirrorRuleAction 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorRuleAction

Show TrafficMirrorSession 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorSession

Show TrafficMirrorSessionField 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorSessionField

Show TrafficMirrorTarget 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorTarget

Show TrafficMirrorTargetType 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorTargetType

Show TrafficType 
Instance details

Defined in Amazonka.EC2.Types.TrafficType

Show TransitGateway 
Instance details

Defined in Amazonka.EC2.Types.TransitGateway

Show TransitGatewayAssociation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAssociation

Show TransitGatewayAssociationState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAssociationState

Show TransitGatewayAttachment 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAttachment

Show TransitGatewayAttachmentAssociation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAttachmentAssociation

Show TransitGatewayAttachmentBgpConfiguration 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAttachmentBgpConfiguration

Show TransitGatewayAttachmentPropagation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAttachmentPropagation

Show TransitGatewayAttachmentResourceType 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAttachmentResourceType

Show TransitGatewayAttachmentState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAttachmentState

Show TransitGatewayConnect 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayConnect

Show TransitGatewayConnectOptions 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayConnectOptions

Show TransitGatewayConnectPeer 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayConnectPeer

Show TransitGatewayConnectPeerConfiguration 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayConnectPeerConfiguration

Show TransitGatewayConnectPeerState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayConnectPeerState

Show TransitGatewayConnectRequestBgpOptions 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayConnectRequestBgpOptions

Show TransitGatewayMulitcastDomainAssociationState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulitcastDomainAssociationState

Show TransitGatewayMulticastDeregisteredGroupMembers 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastDeregisteredGroupMembers

Show TransitGatewayMulticastDeregisteredGroupSources 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastDeregisteredGroupSources

Show TransitGatewayMulticastDomain 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastDomain

Show TransitGatewayMulticastDomainAssociation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastDomainAssociation

Show TransitGatewayMulticastDomainAssociations 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastDomainAssociations

Show TransitGatewayMulticastDomainOptions 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastDomainOptions

Show TransitGatewayMulticastDomainState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastDomainState

Show TransitGatewayMulticastGroup 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastGroup

Show TransitGatewayMulticastRegisteredGroupMembers 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastRegisteredGroupMembers

Show TransitGatewayMulticastRegisteredGroupSources 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastRegisteredGroupSources

Show TransitGatewayOptions 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayOptions

Show TransitGatewayPeeringAttachment 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPeeringAttachment

Show TransitGatewayPeeringAttachmentOptions 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPeeringAttachmentOptions

Show TransitGatewayPolicyRule 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPolicyRule

Show TransitGatewayPolicyRuleMetaData 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPolicyRuleMetaData

Show TransitGatewayPolicyTable 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPolicyTable

Show TransitGatewayPolicyTableAssociation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPolicyTableAssociation

Show TransitGatewayPolicyTableEntry 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPolicyTableEntry

Show TransitGatewayPolicyTableState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPolicyTableState

Show TransitGatewayPrefixListAttachment 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPrefixListAttachment

Show TransitGatewayPrefixListReference 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPrefixListReference

Show TransitGatewayPrefixListReferenceState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPrefixListReferenceState

Show TransitGatewayPropagation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPropagation

Show TransitGatewayPropagationState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPropagationState

Show TransitGatewayRequestOptions 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRequestOptions

Show TransitGatewayRoute 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRoute

Show TransitGatewayRouteAttachment 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteAttachment

Show TransitGatewayRouteState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteState

Show TransitGatewayRouteTable 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTable

Show TransitGatewayRouteTableAnnouncement 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTableAnnouncement

Show TransitGatewayRouteTableAnnouncementDirection 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTableAnnouncementDirection

Show TransitGatewayRouteTableAnnouncementState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTableAnnouncementState

Show TransitGatewayRouteTableAssociation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTableAssociation

Show TransitGatewayRouteTablePropagation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTablePropagation

Show TransitGatewayRouteTableRoute 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTableRoute

Show TransitGatewayRouteTableState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTableState

Show TransitGatewayRouteType 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteType

Show TransitGatewayState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayState

Show TransitGatewayVpcAttachment 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayVpcAttachment

Show TransitGatewayVpcAttachmentOptions 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayVpcAttachmentOptions

Show TransportProtocol 
Instance details

Defined in Amazonka.EC2.Types.TransportProtocol

Show TrunkInterfaceAssociation 
Instance details

Defined in Amazonka.EC2.Types.TrunkInterfaceAssociation

Show TrustProviderType 
Instance details

Defined in Amazonka.EC2.Types.TrustProviderType

Show TunnelInsideIpVersion 
Instance details

Defined in Amazonka.EC2.Types.TunnelInsideIpVersion

Show TunnelOption 
Instance details

Defined in Amazonka.EC2.Types.TunnelOption

Show UnlimitedSupportedInstanceFamily 
Instance details

Defined in Amazonka.EC2.Types.UnlimitedSupportedInstanceFamily

Show UnsuccessfulInstanceCreditSpecificationErrorCode 
Instance details

Defined in Amazonka.EC2.Types.UnsuccessfulInstanceCreditSpecificationErrorCode

Show UnsuccessfulInstanceCreditSpecificationItem 
Instance details

Defined in Amazonka.EC2.Types.UnsuccessfulInstanceCreditSpecificationItem

Show UnsuccessfulInstanceCreditSpecificationItemError 
Instance details

Defined in Amazonka.EC2.Types.UnsuccessfulInstanceCreditSpecificationItemError

Show UnsuccessfulItem 
Instance details

Defined in Amazonka.EC2.Types.UnsuccessfulItem

Show UnsuccessfulItemError 
Instance details

Defined in Amazonka.EC2.Types.UnsuccessfulItemError

Show UsageClassType 
Instance details

Defined in Amazonka.EC2.Types.UsageClassType

Show UserBucket 
Instance details

Defined in Amazonka.EC2.Types.UserBucket

Show UserBucketDetails 
Instance details

Defined in Amazonka.EC2.Types.UserBucketDetails

Show UserData 
Instance details

Defined in Amazonka.EC2.Types.UserData

Show UserIdGroupPair 
Instance details

Defined in Amazonka.EC2.Types.UserIdGroupPair

Show UserTrustProviderType 
Instance details

Defined in Amazonka.EC2.Types.UserTrustProviderType

Show VCpuCountRange 
Instance details

Defined in Amazonka.EC2.Types.VCpuCountRange

Show VCpuCountRangeRequest 
Instance details

Defined in Amazonka.EC2.Types.VCpuCountRangeRequest

Show VCpuInfo 
Instance details

Defined in Amazonka.EC2.Types.VCpuInfo

Show ValidationError 
Instance details

Defined in Amazonka.EC2.Types.ValidationError

Show ValidationWarning 
Instance details

Defined in Amazonka.EC2.Types.ValidationWarning

Show VerifiedAccessEndpoint 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpoint

Show VerifiedAccessEndpointAttachmentType 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointAttachmentType

Show VerifiedAccessEndpointEniOptions 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointEniOptions

Show VerifiedAccessEndpointLoadBalancerOptions 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointLoadBalancerOptions

Show VerifiedAccessEndpointProtocol 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointProtocol

Show VerifiedAccessEndpointStatus 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointStatus

Show VerifiedAccessEndpointStatusCode 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointStatusCode

Show VerifiedAccessEndpointType 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointType

Show VerifiedAccessGroup 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessGroup

Show VerifiedAccessInstance 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessInstance

Show VerifiedAccessInstanceLoggingConfiguration 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessInstanceLoggingConfiguration

Show VerifiedAccessLogCloudWatchLogsDestination 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogCloudWatchLogsDestination

Show VerifiedAccessLogCloudWatchLogsDestinationOptions 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogCloudWatchLogsDestinationOptions

Show VerifiedAccessLogDeliveryStatus 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogDeliveryStatus

Show VerifiedAccessLogDeliveryStatusCode 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogDeliveryStatusCode

Show VerifiedAccessLogKinesisDataFirehoseDestination 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogKinesisDataFirehoseDestination

Show VerifiedAccessLogKinesisDataFirehoseDestinationOptions 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogKinesisDataFirehoseDestinationOptions

Show VerifiedAccessLogOptions 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogOptions

Show VerifiedAccessLogS3Destination 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogS3Destination

Show VerifiedAccessLogS3DestinationOptions 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogS3DestinationOptions

Show VerifiedAccessLogs 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogs

Show VerifiedAccessTrustProvider 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessTrustProvider

Show VerifiedAccessTrustProviderCondensed 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessTrustProviderCondensed

Show VgwTelemetry 
Instance details

Defined in Amazonka.EC2.Types.VgwTelemetry

Show VirtualizationType 
Instance details

Defined in Amazonka.EC2.Types.VirtualizationType

Show Volume 
Instance details

Defined in Amazonka.EC2.Types.Volume

Show VolumeAttachment 
Instance details

Defined in Amazonka.EC2.Types.VolumeAttachment

Show VolumeAttachmentState 
Instance details

Defined in Amazonka.EC2.Types.VolumeAttachmentState

Show VolumeAttributeName 
Instance details

Defined in Amazonka.EC2.Types.VolumeAttributeName

Show VolumeDetail 
Instance details

Defined in Amazonka.EC2.Types.VolumeDetail

Show VolumeModification 
Instance details

Defined in Amazonka.EC2.Types.VolumeModification

Show VolumeModificationState 
Instance details

Defined in Amazonka.EC2.Types.VolumeModificationState

Show VolumeState 
Instance details

Defined in Amazonka.EC2.Types.VolumeState

Show VolumeStatusAction 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusAction

Show VolumeStatusAttachmentStatus 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusAttachmentStatus

Show VolumeStatusDetails 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusDetails

Show VolumeStatusEvent 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusEvent

Show VolumeStatusInfo 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusInfo

Show VolumeStatusInfoStatus 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusInfoStatus

Show VolumeStatusItem 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusItem

Show VolumeStatusName 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusName

Show VolumeType 
Instance details

Defined in Amazonka.EC2.Types.VolumeType

Show Vpc 
Instance details

Defined in Amazonka.EC2.Types.Vpc

Methods

showsPrec :: Int -> Vpc -> ShowS #

show :: Vpc -> String #

showList :: [Vpc] -> ShowS #

Show VpcAttachment 
Instance details

Defined in Amazonka.EC2.Types.VpcAttachment

Show VpcAttributeName 
Instance details

Defined in Amazonka.EC2.Types.VpcAttributeName

Show VpcCidrBlockAssociation 
Instance details

Defined in Amazonka.EC2.Types.VpcCidrBlockAssociation

Show VpcCidrBlockState 
Instance details

Defined in Amazonka.EC2.Types.VpcCidrBlockState

Show VpcCidrBlockStateCode 
Instance details

Defined in Amazonka.EC2.Types.VpcCidrBlockStateCode

Show VpcClassicLink 
Instance details

Defined in Amazonka.EC2.Types.VpcClassicLink

Show VpcEndpoint 
Instance details

Defined in Amazonka.EC2.Types.VpcEndpoint

Show VpcEndpointConnection 
Instance details

Defined in Amazonka.EC2.Types.VpcEndpointConnection

Show VpcEndpointType 
Instance details

Defined in Amazonka.EC2.Types.VpcEndpointType

Show VpcIpv6CidrBlockAssociation 
Instance details

Defined in Amazonka.EC2.Types.VpcIpv6CidrBlockAssociation

Show VpcPeeringConnection 
Instance details

Defined in Amazonka.EC2.Types.VpcPeeringConnection

Show VpcPeeringConnectionOptionsDescription 
Instance details

Defined in Amazonka.EC2.Types.VpcPeeringConnectionOptionsDescription

Show VpcPeeringConnectionStateReason 
Instance details

Defined in Amazonka.EC2.Types.VpcPeeringConnectionStateReason

Show VpcPeeringConnectionStateReasonCode 
Instance details

Defined in Amazonka.EC2.Types.VpcPeeringConnectionStateReasonCode

Show VpcPeeringConnectionVpcInfo 
Instance details

Defined in Amazonka.EC2.Types.VpcPeeringConnectionVpcInfo

Show VpcState 
Instance details

Defined in Amazonka.EC2.Types.VpcState

Show VpcTenancy 
Instance details

Defined in Amazonka.EC2.Types.VpcTenancy

Show VpnConnection 
Instance details

Defined in Amazonka.EC2.Types.VpnConnection

Show VpnConnectionDeviceType 
Instance details

Defined in Amazonka.EC2.Types.VpnConnectionDeviceType

Show VpnConnectionOptions 
Instance details

Defined in Amazonka.EC2.Types.VpnConnectionOptions

Show VpnConnectionOptionsSpecification 
Instance details

Defined in Amazonka.EC2.Types.VpnConnectionOptionsSpecification

Show VpnEcmpSupportValue 
Instance details

Defined in Amazonka.EC2.Types.VpnEcmpSupportValue

Show VpnGateway 
Instance details

Defined in Amazonka.EC2.Types.VpnGateway

Show VpnProtocol 
Instance details

Defined in Amazonka.EC2.Types.VpnProtocol

Show VpnState 
Instance details

Defined in Amazonka.EC2.Types.VpnState

Show VpnStaticRoute 
Instance details

Defined in Amazonka.EC2.Types.VpnStaticRoute

Show VpnStaticRouteSource 
Instance details

Defined in Amazonka.EC2.Types.VpnStaticRouteSource

Show VpnTunnelLogOptions 
Instance details

Defined in Amazonka.EC2.Types.VpnTunnelLogOptions

Show VpnTunnelLogOptionsSpecification 
Instance details

Defined in Amazonka.EC2.Types.VpnTunnelLogOptionsSpecification

Show VpnTunnelOptionsSpecification 
Instance details

Defined in Amazonka.EC2.Types.VpnTunnelOptionsSpecification

Show WeekDay 
Instance details

Defined in Amazonka.EC2.Types.WeekDay

Show Invoke 
Instance details

Defined in Amazonka.Lambda.Invoke

Show InvokeResponse 
Instance details

Defined in Amazonka.Lambda.Invoke

Show AccountLimit 
Instance details

Defined in Amazonka.Lambda.Types.AccountLimit

Show AccountUsage 
Instance details

Defined in Amazonka.Lambda.Types.AccountUsage

Show AliasConfiguration 
Instance details

Defined in Amazonka.Lambda.Types.AliasConfiguration

Show AliasRoutingConfiguration 
Instance details

Defined in Amazonka.Lambda.Types.AliasRoutingConfiguration

Show AllowedPublishers 
Instance details

Defined in Amazonka.Lambda.Types.AllowedPublishers

Show AmazonManagedKafkaEventSourceConfig 
Instance details

Defined in Amazonka.Lambda.Types.AmazonManagedKafkaEventSourceConfig

Show Architecture 
Instance details

Defined in Amazonka.Lambda.Types.Architecture

Show CodeSigningConfig 
Instance details

Defined in Amazonka.Lambda.Types.CodeSigningConfig

Show CodeSigningPolicies 
Instance details

Defined in Amazonka.Lambda.Types.CodeSigningPolicies

Show CodeSigningPolicy 
Instance details

Defined in Amazonka.Lambda.Types.CodeSigningPolicy

Show Concurrency 
Instance details

Defined in Amazonka.Lambda.Types.Concurrency

Show Cors 
Instance details

Defined in Amazonka.Lambda.Types.Cors

Methods

showsPrec :: Int -> Cors -> ShowS #

show :: Cors -> String #

showList :: [Cors] -> ShowS #

Show DeadLetterConfig 
Instance details

Defined in Amazonka.Lambda.Types.DeadLetterConfig

Show DestinationConfig 
Instance details

Defined in Amazonka.Lambda.Types.DestinationConfig

Show EndPointType 
Instance details

Defined in Amazonka.Lambda.Types.EndPointType

Show Environment 
Instance details

Defined in Amazonka.Lambda.Types.Environment

Show EnvironmentError 
Instance details

Defined in Amazonka.Lambda.Types.EnvironmentError

Show EnvironmentResponse 
Instance details

Defined in Amazonka.Lambda.Types.EnvironmentResponse

Show EphemeralStorage 
Instance details

Defined in Amazonka.Lambda.Types.EphemeralStorage

Show EventSourceMappingConfiguration 
Instance details

Defined in Amazonka.Lambda.Types.EventSourceMappingConfiguration

Show EventSourcePosition 
Instance details

Defined in Amazonka.Lambda.Types.EventSourcePosition

Show FileSystemConfig 
Instance details

Defined in Amazonka.Lambda.Types.FileSystemConfig

Show Filter 
Instance details

Defined in Amazonka.Lambda.Types.Filter

Show FilterCriteria 
Instance details

Defined in Amazonka.Lambda.Types.FilterCriteria

Show FunctionCode 
Instance details

Defined in Amazonka.Lambda.Types.FunctionCode

Show FunctionCodeLocation 
Instance details

Defined in Amazonka.Lambda.Types.FunctionCodeLocation

Show FunctionConfiguration 
Instance details

Defined in Amazonka.Lambda.Types.FunctionConfiguration

Show FunctionEventInvokeConfig 
Instance details

Defined in Amazonka.Lambda.Types.FunctionEventInvokeConfig

Show FunctionResponseType 
Instance details

Defined in Amazonka.Lambda.Types.FunctionResponseType

Show FunctionUrlAuthType 
Instance details

Defined in Amazonka.Lambda.Types.FunctionUrlAuthType

Show FunctionUrlConfig 
Instance details

Defined in Amazonka.Lambda.Types.FunctionUrlConfig

Show FunctionVersion 
Instance details

Defined in Amazonka.Lambda.Types.FunctionVersion

Show GetLayerVersionResponse 
Instance details

Defined in Amazonka.Lambda.Types.GetLayerVersionResponse

Show ImageConfig 
Instance details

Defined in Amazonka.Lambda.Types.ImageConfig

Show ImageConfigError 
Instance details

Defined in Amazonka.Lambda.Types.ImageConfigError

Show ImageConfigResponse 
Instance details

Defined in Amazonka.Lambda.Types.ImageConfigResponse

Show InvocationType 
Instance details

Defined in Amazonka.Lambda.Types.InvocationType

Show LastUpdateStatus 
Instance details

Defined in Amazonka.Lambda.Types.LastUpdateStatus

Show LastUpdateStatusReasonCode 
Instance details

Defined in Amazonka.Lambda.Types.LastUpdateStatusReasonCode

Show Layer 
Instance details

Defined in Amazonka.Lambda.Types.Layer

Methods

showsPrec :: Int -> Layer -> ShowS #

show :: Layer -> String #

showList :: [Layer] -> ShowS #

Show LayerVersionContentInput 
Instance details

Defined in Amazonka.Lambda.Types.LayerVersionContentInput

Show LayerVersionContentOutput 
Instance details

Defined in Amazonka.Lambda.Types.LayerVersionContentOutput

Show LayerVersionsListItem 
Instance details

Defined in Amazonka.Lambda.Types.LayerVersionsListItem

Show LayersListItem 
Instance details

Defined in Amazonka.Lambda.Types.LayersListItem

Show LogType 
Instance details

Defined in Amazonka.Lambda.Types.LogType

Show OnFailure 
Instance details

Defined in Amazonka.Lambda.Types.OnFailure

Show OnSuccess 
Instance details

Defined in Amazonka.Lambda.Types.OnSuccess

Show PackageType 
Instance details

Defined in Amazonka.Lambda.Types.PackageType

Show ProvisionedConcurrencyConfigListItem 
Instance details

Defined in Amazonka.Lambda.Types.ProvisionedConcurrencyConfigListItem

Show ProvisionedConcurrencyStatusEnum 
Instance details

Defined in Amazonka.Lambda.Types.ProvisionedConcurrencyStatusEnum

Show Runtime 
Instance details

Defined in Amazonka.Lambda.Types.Runtime

Show SelfManagedEventSource 
Instance details

Defined in Amazonka.Lambda.Types.SelfManagedEventSource

Show SelfManagedKafkaEventSourceConfig 
Instance details

Defined in Amazonka.Lambda.Types.SelfManagedKafkaEventSourceConfig

Show SnapStart 
Instance details

Defined in Amazonka.Lambda.Types.SnapStart

Show SnapStartApplyOn 
Instance details

Defined in Amazonka.Lambda.Types.SnapStartApplyOn

Show SnapStartOptimizationStatus 
Instance details

Defined in Amazonka.Lambda.Types.SnapStartOptimizationStatus

Show SnapStartResponse 
Instance details

Defined in Amazonka.Lambda.Types.SnapStartResponse

Show SourceAccessConfiguration 
Instance details

Defined in Amazonka.Lambda.Types.SourceAccessConfiguration

Show SourceAccessType 
Instance details

Defined in Amazonka.Lambda.Types.SourceAccessType

Show State 
Instance details

Defined in Amazonka.Lambda.Types.State

Methods

showsPrec :: Int -> State -> ShowS #

show :: State -> String #

showList :: [State] -> ShowS #

Show StateReasonCode 
Instance details

Defined in Amazonka.Lambda.Types.StateReasonCode

Show TracingConfig 
Instance details

Defined in Amazonka.Lambda.Types.TracingConfig

Show TracingConfigResponse 
Instance details

Defined in Amazonka.Lambda.Types.TracingConfigResponse

Show TracingMode 
Instance details

Defined in Amazonka.Lambda.Types.TracingMode

Show VpcConfig 
Instance details

Defined in Amazonka.Lambda.Types.VpcConfig

Show VpcConfigResponse 
Instance details

Defined in Amazonka.Lambda.Types.VpcConfigResponse

Show GetRoleCredentials 
Instance details

Defined in Amazonka.SSO.GetRoleCredentials

Show GetRoleCredentialsResponse 
Instance details

Defined in Amazonka.SSO.GetRoleCredentials

Show ListAccountRoles 
Instance details

Defined in Amazonka.SSO.ListAccountRoles

Show ListAccountRolesResponse 
Instance details

Defined in Amazonka.SSO.ListAccountRoles

Show ListAccounts 
Instance details

Defined in Amazonka.SSO.ListAccounts

Show ListAccountsResponse 
Instance details

Defined in Amazonka.SSO.ListAccounts

Show Logout 
Instance details

Defined in Amazonka.SSO.Logout

Show LogoutResponse 
Instance details

Defined in Amazonka.SSO.Logout

Show AccountInfo 
Instance details

Defined in Amazonka.SSO.Types.AccountInfo

Show RoleCredentials 
Instance details

Defined in Amazonka.SSO.Types.RoleCredentials

Show RoleInfo 
Instance details

Defined in Amazonka.SSO.Types.RoleInfo

Show AssumeRole 
Instance details

Defined in Amazonka.STS.AssumeRole

Show AssumeRoleResponse 
Instance details

Defined in Amazonka.STS.AssumeRole

Show AssumeRoleWithSAML 
Instance details

Defined in Amazonka.STS.AssumeRoleWithSAML

Show AssumeRoleWithSAMLResponse 
Instance details

Defined in Amazonka.STS.AssumeRoleWithSAML

Show AssumeRoleWithWebIdentity 
Instance details

Defined in Amazonka.STS.AssumeRoleWithWebIdentity

Show AssumeRoleWithWebIdentityResponse 
Instance details

Defined in Amazonka.STS.AssumeRoleWithWebIdentity

Show DecodeAuthorizationMessage 
Instance details

Defined in Amazonka.STS.DecodeAuthorizationMessage

Show DecodeAuthorizationMessageResponse 
Instance details

Defined in Amazonka.STS.DecodeAuthorizationMessage

Show GetAccessKeyInfo 
Instance details

Defined in Amazonka.STS.GetAccessKeyInfo

Show GetAccessKeyInfoResponse 
Instance details

Defined in Amazonka.STS.GetAccessKeyInfo

Show GetCallerIdentity 
Instance details

Defined in Amazonka.STS.GetCallerIdentity

Show GetCallerIdentityResponse 
Instance details

Defined in Amazonka.STS.GetCallerIdentity

Show GetFederationToken 
Instance details

Defined in Amazonka.STS.GetFederationToken

Show GetFederationTokenResponse 
Instance details

Defined in Amazonka.STS.GetFederationToken

Show GetSessionToken 
Instance details

Defined in Amazonka.STS.GetSessionToken

Show GetSessionTokenResponse 
Instance details

Defined in Amazonka.STS.GetSessionToken

Show AssumedRoleUser 
Instance details

Defined in Amazonka.STS.Types.AssumedRoleUser

Show FederatedUser 
Instance details

Defined in Amazonka.STS.Types.FederatedUser

Show PolicyDescriptorType 
Instance details

Defined in Amazonka.STS.Types.PolicyDescriptorType

Show Tag 
Instance details

Defined in Amazonka.STS.Types.Tag

Methods

showsPrec :: Int -> Tag -> ShowS #

show :: Tag -> String #

showList :: [Tag] -> ShowS #

Show AsyncCancelled 
Instance details

Defined in Control.Concurrent.Async

Show ExceptionInLinkedThread 
Instance details

Defined in Control.Concurrent.Async

Show More 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

showsPrec :: Int -> More -> ShowS #

show :: More -> String #

showList :: [More] -> ShowS #

Show Pos 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

showsPrec :: Int -> Pos -> ShowS #

show :: Pos -> String #

showList :: [Pos] -> ShowS #

Show Constr

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Show ConstrRep

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Show DataRep

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Show DataType

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Show Fixity

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Show All

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

showsPrec :: Int -> All -> ShowS #

show :: All -> String #

showList :: [All] -> ShowS #

Show Any

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

showsPrec :: Int -> Any -> ShowS #

show :: Any -> String #

showList :: [Any] -> ShowS #

Show SomeTypeRep

Since: base-4.10.0.0

Instance details

Defined in Data.Typeable.Internal

Show Version

Since: base-2.1

Instance details

Defined in Data.Version

Show Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Methods

showsPrec :: Int -> Void -> ShowS #

show :: Void -> String #

showList :: [Void] -> ShowS #

Show CBool 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CBool -> ShowS #

show :: CBool -> String #

showList :: [CBool] -> ShowS #

Show CChar 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CChar -> ShowS #

show :: CChar -> String #

showList :: [CChar] -> ShowS #

Show CClock 
Instance details

Defined in Foreign.C.Types

Show CDouble 
Instance details

Defined in Foreign.C.Types

Show CFloat 
Instance details

Defined in Foreign.C.Types

Show CInt 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CInt -> ShowS #

show :: CInt -> String #

showList :: [CInt] -> ShowS #

Show CIntMax 
Instance details

Defined in Foreign.C.Types

Show CIntPtr 
Instance details

Defined in Foreign.C.Types

Show CLLong 
Instance details

Defined in Foreign.C.Types

Show CLong 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CLong -> ShowS #

show :: CLong -> String #

showList :: [CLong] -> ShowS #

Show CPtrdiff 
Instance details

Defined in Foreign.C.Types

Show CSChar 
Instance details

Defined in Foreign.C.Types

Show CSUSeconds 
Instance details

Defined in Foreign.C.Types

Show CShort 
Instance details

Defined in Foreign.C.Types

Show CSigAtomic 
Instance details

Defined in Foreign.C.Types

Show CSize 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CSize -> ShowS #

show :: CSize -> String #

showList :: [CSize] -> ShowS #

Show CTime 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CTime -> ShowS #

show :: CTime -> String #

showList :: [CTime] -> ShowS #

Show CUChar 
Instance details

Defined in Foreign.C.Types

Show CUInt 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CUInt -> ShowS #

show :: CUInt -> String #

showList :: [CUInt] -> ShowS #

Show CUIntMax 
Instance details

Defined in Foreign.C.Types

Show CUIntPtr 
Instance details

Defined in Foreign.C.Types

Show CULLong 
Instance details

Defined in Foreign.C.Types

Show CULong 
Instance details

Defined in Foreign.C.Types

Show CUSeconds 
Instance details

Defined in Foreign.C.Types

Show CUShort 
Instance details

Defined in Foreign.C.Types

Show CWchar 
Instance details

Defined in Foreign.C.Types

Show BlockReason

Since: base-4.3.0.0

Instance details

Defined in GHC.Conc.Sync

Show ThreadId

Since: base-4.2.0.0

Instance details

Defined in GHC.Conc.Sync

Show ThreadStatus

Since: base-4.3.0.0

Instance details

Defined in GHC.Conc.Sync

Show ArithException

Since: base-4.0.0.0

Instance details

Defined in GHC.Exception.Type

Show SomeException

Since: base-3.0

Instance details

Defined in GHC.Exception.Type

Show Fingerprint

Since: base-4.7.0.0

Instance details

Defined in GHC.Fingerprint.Type

Show Associativity

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Show DecidedStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Show Fixity

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Show SourceStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Show SourceUnpackedness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Show MaskingState

Since: base-4.3.0.0

Instance details

Defined in GHC.IO

Show SeekMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Device

Show AllocationLimitExceeded

Since: base-4.7.1.0

Instance details

Defined in GHC.IO.Exception

Show ArrayException

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Show AssertionFailed

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Show AsyncException

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Show BlockedIndefinitelyOnMVar

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Show BlockedIndefinitelyOnSTM

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Show CompactionFailed

Since: base-4.10.0.0

Instance details

Defined in GHC.IO.Exception

Show Deadlock

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Show ExitCode 
Instance details

Defined in GHC.IO.Exception

Show FixIOException

Since: base-4.11.0.0

Instance details

Defined in GHC.IO.Exception

Show IOErrorType

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Show IOException

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Show SomeAsyncException

Since: base-4.7.0.0

Instance details

Defined in GHC.IO.Exception

Show BufferMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Handle.Types

Show Handle

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Handle.Types

Show HandleType

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Handle.Types

Show Newline

Since: base-4.3.0.0

Instance details

Defined in GHC.IO.Handle.Types

Show NewlineMode

Since: base-4.3.0.0

Instance details

Defined in GHC.IO.Handle.Types

Show IOMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.IOMode

Show Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

showsPrec :: Int -> Int16 -> ShowS #

show :: Int16 -> String #

showList :: [Int16] -> ShowS #

Show Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

showsPrec :: Int -> Int32 -> ShowS #

show :: Int32 -> String #

showList :: [Int32] -> ShowS #

Show Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

showsPrec :: Int -> Int64 -> ShowS #

show :: Int64 -> String #

showList :: [Int64] -> ShowS #

Show Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

showsPrec :: Int -> Int8 -> ShowS #

show :: Int8 -> String #

showList :: [Int8] -> ShowS #

Show CCFlags

Since: base-4.8.0.0

Instance details

Defined in GHC.RTS.Flags

Show ConcFlags

Since: base-4.8.0.0

Instance details

Defined in GHC.RTS.Flags

Show DebugFlags

Since: base-4.8.0.0

Instance details

Defined in GHC.RTS.Flags

Show DoCostCentres

Since: base-4.8.0.0

Instance details

Defined in GHC.RTS.Flags

Show DoHeapProfile

Since: base-4.8.0.0

Instance details

Defined in GHC.RTS.Flags

Show DoTrace

Since: base-4.8.0.0

Instance details

Defined in GHC.RTS.Flags

Show GCFlags

Since: base-4.8.0.0

Instance details

Defined in GHC.RTS.Flags

Show GiveGCStats

Since: base-4.8.0.0

Instance details

Defined in GHC.RTS.Flags

Show IoSubSystem 
Instance details

Defined in GHC.RTS.Flags

Show MiscFlags

Since: base-4.8.0.0

Instance details

Defined in GHC.RTS.Flags

Show ParFlags

Since: base-4.8.0.0

Instance details

Defined in GHC.RTS.Flags

Show ProfFlags

Since: base-4.8.0.0

Instance details

Defined in GHC.RTS.Flags

Show RTSFlags

Since: base-4.8.0.0

Instance details

Defined in GHC.RTS.Flags

Show TickyFlags

Since: base-4.8.0.0

Instance details

Defined in GHC.RTS.Flags

Show TraceFlags

Since: base-4.8.0.0

Instance details

Defined in GHC.RTS.Flags

Show FractionalExponentBase 
Instance details

Defined in GHC.Real

Show CallStack

Since: base-4.9.0.0

Instance details

Defined in GHC.Show

Show SrcLoc

Since: base-4.9.0.0

Instance details

Defined in GHC.Show

Show GCDetails

Since: base-4.10.0.0

Instance details

Defined in GHC.Stats

Show RTSStats

Since: base-4.10.0.0

Instance details

Defined in GHC.Stats

Show SomeChar 
Instance details

Defined in GHC.TypeLits

Show SomeSymbol

Since: base-4.7.0.0

Instance details

Defined in GHC.TypeLits

Show SomeNat

Since: base-4.7.0.0

Instance details

Defined in GHC.TypeNats

Show GeneralCategory

Since: base-2.1

Instance details

Defined in GHC.Unicode

Show Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Show Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Show Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Show Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Methods

showsPrec :: Int -> Word8 -> ShowS #

show :: Word8 -> String #

showList :: [Word8] -> ShowS #

Show CBlkCnt 
Instance details

Defined in System.Posix.Types

Show CBlkSize 
Instance details

Defined in System.Posix.Types

Show CCc 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CCc -> ShowS #

show :: CCc -> String #

showList :: [CCc] -> ShowS #

Show CClockId 
Instance details

Defined in System.Posix.Types

Show CDev 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CDev -> ShowS #

show :: CDev -> String #

showList :: [CDev] -> ShowS #

Show CFsBlkCnt 
Instance details

Defined in System.Posix.Types

Show CFsFilCnt 
Instance details

Defined in System.Posix.Types

Show CGid 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CGid -> ShowS #

show :: CGid -> String #

showList :: [CGid] -> ShowS #

Show CId 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CId -> ShowS #

show :: CId -> String #

showList :: [CId] -> ShowS #

Show CIno 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CIno -> ShowS #

show :: CIno -> String #

showList :: [CIno] -> ShowS #

Show CKey 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CKey -> ShowS #

show :: CKey -> String #

showList :: [CKey] -> ShowS #

Show CMode 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CMode -> ShowS #

show :: CMode -> String #

showList :: [CMode] -> ShowS #

Show CNfds 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CNfds -> ShowS #

show :: CNfds -> String #

showList :: [CNfds] -> ShowS #

Show CNlink 
Instance details

Defined in System.Posix.Types

Show COff 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> COff -> ShowS #

show :: COff -> String #

showList :: [COff] -> ShowS #

Show CPid 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CPid -> ShowS #

show :: CPid -> String #

showList :: [CPid] -> ShowS #

Show CRLim 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CRLim -> ShowS #

show :: CRLim -> String #

showList :: [CRLim] -> ShowS #

Show CSocklen 
Instance details

Defined in System.Posix.Types

Show CSpeed 
Instance details

Defined in System.Posix.Types

Show CSsize 
Instance details

Defined in System.Posix.Types

Show CTcflag 
Instance details

Defined in System.Posix.Types

Show CTimer 
Instance details

Defined in System.Posix.Types

Show CUid 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CUid -> ShowS #

show :: CUid -> String #

showList :: [CUid] -> ShowS #

Show Fd 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> Fd -> ShowS #

show :: Fd -> String #

showList :: [Fd] -> ShowS #

Show Encoding 
Instance details

Defined in Basement.String

Show ASCII7_Invalid 
Instance details

Defined in Basement.String.Encoding.ASCII7

Methods

showsPrec :: Int -> ASCII7_Invalid -> ShowS #

show :: ASCII7_Invalid -> String #

showList :: [ASCII7_Invalid] -> ShowS #

Show ISO_8859_1_Invalid 
Instance details

Defined in Basement.String.Encoding.ISO_8859_1

Methods

showsPrec :: Int -> ISO_8859_1_Invalid -> ShowS #

show :: ISO_8859_1_Invalid -> String #

showList :: [ISO_8859_1_Invalid] -> ShowS #

Show UTF16_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF16

Methods

showsPrec :: Int -> UTF16_Invalid -> ShowS #

show :: UTF16_Invalid -> String #

showList :: [UTF16_Invalid] -> ShowS #

Show UTF32_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF32

Methods

showsPrec :: Int -> UTF32_Invalid -> ShowS #

show :: UTF32_Invalid -> String #

showList :: [UTF32_Invalid] -> ShowS #

Show FileSize 
Instance details

Defined in Basement.Types.OffsetSize

Show String 
Instance details

Defined in Basement.UTF8.Base

Show ByteString 
Instance details

Defined in Data.ByteString.Internal

Show ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Show ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Show IntSet 
Instance details

Defined in Data.IntSet.Internal

Show NotFoundException 
Instance details

Defined in Context.Internal

Show Curve_Edwards25519 
Instance details

Defined in Crypto.ECC

Show Curve_P256R1 
Instance details

Defined in Crypto.ECC

Show Curve_P384R1 
Instance details

Defined in Crypto.ECC

Show Curve_P521R1 
Instance details

Defined in Crypto.ECC

Show Curve_X25519 
Instance details

Defined in Crypto.ECC

Show Curve_X448 
Instance details

Defined in Crypto.ECC

Show CryptoError 
Instance details

Defined in Crypto.Error.Types

Show Blake2b_160 
Instance details

Defined in Crypto.Hash.Blake2b

Show Blake2b_224 
Instance details

Defined in Crypto.Hash.Blake2b

Show Blake2b_256 
Instance details

Defined in Crypto.Hash.Blake2b

Show Blake2b_384 
Instance details

Defined in Crypto.Hash.Blake2b

Show Blake2b_512 
Instance details

Defined in Crypto.Hash.Blake2b

Show Blake2bp_512 
Instance details

Defined in Crypto.Hash.Blake2bp

Show Blake2s_160 
Instance details

Defined in Crypto.Hash.Blake2s

Show Blake2s_224 
Instance details

Defined in Crypto.Hash.Blake2s

Show Blake2s_256 
Instance details

Defined in Crypto.Hash.Blake2s

Show Blake2sp_224 
Instance details

Defined in Crypto.Hash.Blake2sp

Show Blake2sp_256 
Instance details

Defined in Crypto.Hash.Blake2sp

Show Keccak_224 
Instance details

Defined in Crypto.Hash.Keccak

Show Keccak_256 
Instance details

Defined in Crypto.Hash.Keccak

Show Keccak_384 
Instance details

Defined in Crypto.Hash.Keccak

Show Keccak_512 
Instance details

Defined in Crypto.Hash.Keccak

Show MD2 
Instance details

Defined in Crypto.Hash.MD2

Methods

showsPrec :: Int -> MD2 -> ShowS #

show :: MD2 -> String #

showList :: [MD2] -> ShowS #

Show MD4 
Instance details

Defined in Crypto.Hash.MD4

Methods

showsPrec :: Int -> MD4 -> ShowS #

show :: MD4 -> String #

showList :: [MD4] -> ShowS #

Show MD5 
Instance details

Defined in Crypto.Hash.MD5

Methods

showsPrec :: Int -> MD5 -> ShowS #

show :: MD5 -> String #

showList :: [MD5] -> ShowS #

Show RIPEMD160 
Instance details

Defined in Crypto.Hash.RIPEMD160

Show SHA1 
Instance details

Defined in Crypto.Hash.SHA1

Methods

showsPrec :: Int -> SHA1 -> ShowS #

show :: SHA1 -> String #

showList :: [SHA1] -> ShowS #

Show SHA224 
Instance details

Defined in Crypto.Hash.SHA224

Show SHA256 
Instance details

Defined in Crypto.Hash.SHA256

Show SHA3_224 
Instance details

Defined in Crypto.Hash.SHA3

Show SHA3_256 
Instance details

Defined in Crypto.Hash.SHA3

Show SHA3_384 
Instance details

Defined in Crypto.Hash.SHA3

Show SHA3_512 
Instance details

Defined in Crypto.Hash.SHA3

Show SHA384 
Instance details

Defined in Crypto.Hash.SHA384

Show SHA512 
Instance details

Defined in Crypto.Hash.SHA512

Show SHA512t_224 
Instance details

Defined in Crypto.Hash.SHA512t

Show SHA512t_256 
Instance details

Defined in Crypto.Hash.SHA512t

Show Skein256_224 
Instance details

Defined in Crypto.Hash.Skein256

Show Skein256_256 
Instance details

Defined in Crypto.Hash.Skein256

Show Skein512_224 
Instance details

Defined in Crypto.Hash.Skein512

Show Skein512_256 
Instance details

Defined in Crypto.Hash.Skein512

Show Skein512_384 
Instance details

Defined in Crypto.Hash.Skein512

Show Skein512_512 
Instance details

Defined in Crypto.Hash.Skein512

Show Tiger 
Instance details

Defined in Crypto.Hash.Tiger

Methods

showsPrec :: Int -> Tiger -> ShowS #

show :: Tiger -> String #

showList :: [Tiger] -> ShowS #

Show Whirlpool 
Instance details

Defined in Crypto.Hash.Whirlpool

Show ByteArray 
Instance details

Defined in Data.Array.Byte

Show Error 
Instance details

Defined in Env.Internal.Error

Methods

showsPrec :: Int -> Error -> ShowS #

show :: Error -> String #

showList :: [Error] -> ShowS #

Show LogStr 
Instance details

Defined in System.Log.FastLogger.LogStr

Show ForeignSrcLang 
Instance details

Defined in GHC.ForeignSrcLang.Type

Show Extension 
Instance details

Defined in GHC.LanguageExtensions.Type

Show KindRep 
Instance details

Defined in GHC.Show

Show Module

Since: base-4.9.0.0

Instance details

Defined in GHC.Show

Show Ordering

Since: base-2.1

Instance details

Defined in GHC.Show

Show TrName

Since: base-4.9.0.0

Instance details

Defined in GHC.Show

Show TyCon

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> TyCon -> ShowS #

show :: TyCon -> String #

showList :: [TyCon] -> ShowS #

Show TypeLitSort

Since: base-4.11.0.0

Instance details

Defined in GHC.Show

Show EncapsulatedPopperException 
Instance details

Defined in Network.HTTP.Client.Request

Methods

showsPrec :: Int -> EncapsulatedPopperException -> ShowS #

show :: EncapsulatedPopperException -> String #

showList :: [EncapsulatedPopperException] -> ShowS #

Show ConnHost 
Instance details

Defined in Network.HTTP.Client.Types

Show ConnKey 
Instance details

Defined in Network.HTTP.Client.Types

Show Cookie 
Instance details

Defined in Network.HTTP.Client.Types

Show CookieJar 
Instance details

Defined in Network.HTTP.Client.Types

Show HttpException 
Instance details

Defined in Network.HTTP.Client.Types

Show HttpExceptionContent 
Instance details

Defined in Network.HTTP.Client.Types

Show HttpExceptionContentWrapper 
Instance details

Defined in Network.HTTP.Client.Types

Methods

showsPrec :: Int -> HttpExceptionContentWrapper -> ShowS #

show :: HttpExceptionContentWrapper -> String #

showList :: [HttpExceptionContentWrapper] -> ShowS #

Show MaxHeaderLength 
Instance details

Defined in Network.HTTP.Client.Types

Show Proxy 
Instance details

Defined in Network.HTTP.Client.Types

Methods

showsPrec :: Int -> Proxy -> ShowS #

show :: Proxy -> String #

showList :: [Proxy] -> ShowS #

Show ProxySecureMode 
Instance details

Defined in Network.HTTP.Client.Types

Show Request 
Instance details

Defined in Network.HTTP.Client.Types

Show ResponseClose 
Instance details

Defined in Network.HTTP.Client.Types

Show ResponseTimeout 
Instance details

Defined in Network.HTTP.Client.Types

Show StatusHeaders 
Instance details

Defined in Network.HTTP.Client.Types

Show StreamFileStatus 
Instance details

Defined in Network.HTTP.Client.Types

Show ByteRange 
Instance details

Defined in Network.HTTP.Types.Header

Show StdMethod 
Instance details

Defined in Network.HTTP.Types.Method

Show Status 
Instance details

Defined in Network.HTTP.Types.Status

Show IP 
Instance details

Defined in Data.IP.Addr

Methods

showsPrec :: Int -> IP -> ShowS #

show :: IP -> String #

showList :: [IP] -> ShowS #

Show IPv4 
Instance details

Defined in Data.IP.Addr

Methods

showsPrec :: Int -> IPv4 -> ShowS #

show :: IPv4 -> String #

showList :: [IPv4] -> ShowS #

Show IPv6 
Instance details

Defined in Data.IP.Addr

Methods

showsPrec :: Int -> IPv6 -> ShowS #

show :: IPv6 -> String #

showList :: [IPv6] -> ShowS #

Show IPRange 
Instance details

Defined in Data.IP.Range

Show LogLevel 
Instance details

Defined in Control.Monad.Logger

Show LoggedMessage 
Instance details

Defined in Control.Monad.Logger.Aeson.Internal

Show NullError 
Instance details

Defined in Data.NonNull

Methods

showsPrec :: Int -> NullError -> ShowS #

show :: NullError -> String #

showList :: [NullError] -> ShowS #

Show AddrInfo 
Instance details

Defined in Network.Socket.Info

Show AddrInfoFlag 
Instance details

Defined in Network.Socket.Info

Show NameInfoFlag 
Instance details

Defined in Network.Socket.Info

Show URI 
Instance details

Defined in Network.URI

Methods

showsPrec :: Int -> URI -> ShowS #

show :: URI -> String #

showList :: [URI] -> ShowS #

Show URIAuth 
Instance details

Defined in Network.URI

Show ParserHelp 
Instance details

Defined in Options.Applicative.Help.Types

Show AltNodeType 
Instance details

Defined in Options.Applicative.Types

Show ArgPolicy 
Instance details

Defined in Options.Applicative.Types

Show ArgumentReachability 
Instance details

Defined in Options.Applicative.Types

Show Backtracking 
Instance details

Defined in Options.Applicative.Types

Show CompletionResult 
Instance details

Defined in Options.Applicative.Types

Show IsCmdStart 
Instance details

Defined in Options.Applicative.Types

Show OptName 
Instance details

Defined in Options.Applicative.Types

Show OptProperties 
Instance details

Defined in Options.Applicative.Types

Show OptVisibility 
Instance details

Defined in Options.Applicative.Types

Show ParserPrefs 
Instance details

Defined in Options.Applicative.Types

Show Mode 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

showsPrec :: Int -> Mode -> ShowS #

show :: Mode -> String #

showList :: [Mode] -> ShowS #

Show Style 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

showsPrec :: Int -> Style -> ShowS #

show :: Style -> String #

showList :: [Style] -> ShowS #

Show TextDetails 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Show Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Methods

showsPrec :: Int -> Doc -> ShowS #

show :: Doc -> String #

showList :: [Doc] -> ShowS #

Show FusionDepth 
Instance details

Defined in Prettyprinter.Internal

Show LayoutOptions 
Instance details

Defined in Prettyprinter.Internal

Show PageWidth 
Instance details

Defined in Prettyprinter.Internal

Show CmdSpec 
Instance details

Defined in System.Process.Common

Show CreateProcess 
Instance details

Defined in System.Process.Common

Show StdStream 
Instance details

Defined in System.Process.Common

Show StdGen 
Instance details

Defined in System.Random.Internal

Show InvalidAccess 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Show ResourceCleanupException 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Show ReleaseType 
Instance details

Defined in Data.Acquire.Internal

Show RetryAction 
Instance details

Defined in Control.Retry

Show RetryStatus 
Instance details

Defined in Control.Retry

Show LogLevel 
Instance details

Defined in RIO.Prelude.Logger

Show ProcessException 
Instance details

Defined in RIO.Process

Show AsyncExceptionWrapper 
Instance details

Defined in Control.Exception.Safe

Show StringException 
Instance details

Defined in Control.Exception.Safe

Show SyncExceptionWrapper 
Instance details

Defined in Control.Exception.Safe

Show Scientific

See formatScientific if you need more control over the rendering.

Instance details

Defined in Data.Scientific

Show StackDeployResult Source # 
Instance details

Defined in Stackctl.AWS.CloudFormation

Show StackId Source # 
Instance details

Defined in Stackctl.AWS.CloudFormation

Show StackName Source # 
Instance details

Defined in Stackctl.AWS.CloudFormation

Show StackTemplate Source # 
Instance details

Defined in Stackctl.AWS.CloudFormation

Show AccountId Source # 
Instance details

Defined in Stackctl.AWS.Core

Show LambdaError Source # 
Instance details

Defined in Stackctl.AWS.Lambda

Show LambdaInvokeResult Source # 
Instance details

Defined in Stackctl.AWS.Lambda

Show AwsScope Source # 
Instance details

Defined in Stackctl.AWS.Scope

Show Action Source # 
Instance details

Defined in Stackctl.Action

Show ActionOn Source # 
Instance details

Defined in Stackctl.Action

Show ActionRun Source # 
Instance details

Defined in Stackctl.Action

Show ConfigError Source # 
Instance details

Defined in Stackctl.Config

Show RequiredVersion Source # 
Instance details

Defined in Stackctl.Config.RequiredVersion

Show RequiredVersionOp Source # 
Instance details

Defined in Stackctl.Config.RequiredVersion

Show Format Source # 
Instance details

Defined in Stackctl.Spec.Changes.Format

Show StackDescription Source # 
Instance details

Defined in Stackctl.StackDescription

Show StackSpecPath Source # 
Instance details

Defined in Stackctl.StackSpecPath

Show ParameterYaml Source # 
Instance details

Defined in Stackctl.StackSpecYaml

Show ParametersYaml Source # 
Instance details

Defined in Stackctl.StackSpecYaml

Show StackSpecYaml Source # 
Instance details

Defined in Stackctl.StackSpecYaml

Show TagYaml Source # 
Instance details

Defined in Stackctl.StackSpecYaml

Show TagsYaml Source # 
Instance details

Defined in Stackctl.StackSpecYaml

Show AnnLookup 
Instance details

Defined in Language.Haskell.TH.Syntax

Show AnnTarget 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Bang 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Bang -> ShowS #

show :: Bang -> String #

showList :: [Bang] -> ShowS #

Show Body 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Body -> ShowS #

show :: Body -> String #

showList :: [Body] -> ShowS #

Show Bytes 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Bytes -> ShowS #

show :: Bytes -> String #

showList :: [Bytes] -> ShowS #

Show Callconv 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Clause 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Con 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Con -> ShowS #

show :: Con -> String #

showList :: [Con] -> ShowS #

Show Dec 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Dec -> ShowS #

show :: Dec -> String #

showList :: [Dec] -> ShowS #

Show DecidedStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Show DerivClause 
Instance details

Defined in Language.Haskell.TH.Syntax

Show DerivStrategy 
Instance details

Defined in Language.Haskell.TH.Syntax

Show DocLoc 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Exp 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Exp -> ShowS #

show :: Exp -> String #

showList :: [Exp] -> ShowS #

Show FamilyResultSig 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Fixity 
Instance details

Defined in Language.Haskell.TH.Syntax

Show FixityDirection 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Foreign 
Instance details

Defined in Language.Haskell.TH.Syntax

Show FunDep 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Guard 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Guard -> ShowS #

show :: Guard -> String #

showList :: [Guard] -> ShowS #

Show Info 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Info -> ShowS #

show :: Info -> String #

showList :: [Info] -> ShowS #

Show InjectivityAnn 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Inline 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Lit 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Lit -> ShowS #

show :: Lit -> String #

showList :: [Lit] -> ShowS #

Show Loc 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Loc -> ShowS #

show :: Loc -> String #

showList :: [Loc] -> ShowS #

Show Match 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Match -> ShowS #

show :: Match -> String #

showList :: [Match] -> ShowS #

Show ModName 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Module 
Instance details

Defined in Language.Haskell.TH.Syntax

Show ModuleInfo 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Name 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Name -> ShowS #

show :: Name -> String #

showList :: [Name] -> ShowS #

Show NameFlavour 
Instance details

Defined in Language.Haskell.TH.Syntax

Show NameSpace 
Instance details

Defined in Language.Haskell.TH.Syntax

Show OccName 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Overlap 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Pat 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Pat -> ShowS #

show :: Pat -> String #

showList :: [Pat] -> ShowS #

Show PatSynArgs 
Instance details

Defined in Language.Haskell.TH.Syntax

Show PatSynDir 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Phases 
Instance details

Defined in Language.Haskell.TH.Syntax

Show PkgName 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Pragma 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Range 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Range -> ShowS #

show :: Range -> String #

showList :: [Range] -> ShowS #

Show Role 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Role -> ShowS #

show :: Role -> String #

showList :: [Role] -> ShowS #

Show RuleBndr 
Instance details

Defined in Language.Haskell.TH.Syntax

Show RuleMatch 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Safety 
Instance details

Defined in Language.Haskell.TH.Syntax

Show SourceStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Show SourceUnpackedness 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Specificity 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Stmt 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Stmt -> ShowS #

show :: Stmt -> String #

showList :: [Stmt] -> ShowS #

Show TyLit 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> TyLit -> ShowS #

show :: TyLit -> String #

showList :: [TyLit] -> ShowS #

Show TySynEqn 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Type 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Type -> ShowS #

show :: Type -> String #

showList :: [Type] -> ShowS #

Show TypeFamilyHead 
Instance details

Defined in Language.Haskell.TH.Syntax

Show CodePoint 
Instance details

Defined in Data.Text.Encoding

Methods

showsPrec :: Int -> CodePoint -> ShowS #

show :: CodePoint -> String #

showList :: [CodePoint] -> ShowS #

Show DecoderState 
Instance details

Defined in Data.Text.Encoding

Methods

showsPrec :: Int -> DecoderState -> ShowS #

show :: DecoderState -> String #

showList :: [DecoderState] -> ShowS #

Show Decoding 
Instance details

Defined in Data.Text.Encoding

Show UnicodeException 
Instance details

Defined in Data.Text.Encoding.Error

Show ShortText 
Instance details

Defined in Data.Text.Short.Internal

Show ConstructorInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Show ConstructorVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Show DatatypeInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Show DatatypeVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Show FieldStrictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Show Strictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Show Unpackedness 
Instance details

Defined in Language.Haskell.TH.Datatype

Show DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Show TimeLocale 
Instance details

Defined in Data.Time.Format.Locale

Show LocalTime 
Instance details

Defined in Data.Time.LocalTime.Internal.LocalTime

Show ZonedTime 
Instance details

Defined in Data.Time.LocalTime.Internal.ZonedTime

Show ByteStringOutputException 
Instance details

Defined in System.Process.Typed.Internal

Show ExitCodeException 
Instance details

Defined in System.Process.Typed.Internal

Show StringException

Since: unliftio-0.1.0.0

Instance details

Defined in UnliftIO.Exception

Show ConcException 
Instance details

Defined in UnliftIO.Internals.Async

Show UUID

Pretty prints a UUID (without quotation marks). See also toString.

>>> show nil
"00000000-0000-0000-0000-000000000000"
Instance details

Defined in Data.UUID.Types.Internal

Methods

showsPrec :: Int -> UUID -> ShowS #

show :: UUID -> String #

showList :: [UUID] -> ShowS #

Show UnpackedUUID 
Instance details

Defined in Data.UUID.Types.Internal

Show Content 
Instance details

Defined in Data.XML.Types

Show Doctype 
Instance details

Defined in Data.XML.Types

Show Document 
Instance details

Defined in Data.XML.Types

Show Element 
Instance details

Defined in Data.XML.Types

Show Event 
Instance details

Defined in Data.XML.Types

Methods

showsPrec :: Int -> Event -> ShowS #

show :: Event -> String #

showList :: [Event] -> ShowS #

Show ExternalID 
Instance details

Defined in Data.XML.Types

Show Instruction 
Instance details

Defined in Data.XML.Types

Show Miscellaneous 
Instance details

Defined in Data.XML.Types

Show Name 
Instance details

Defined in Data.XML.Types

Methods

showsPrec :: Int -> Name -> ShowS #

show :: Name -> String #

showList :: [Name] -> ShowS #

Show Node 
Instance details

Defined in Data.XML.Types

Methods

showsPrec :: Int -> Node -> ShowS #

show :: Node -> String #

showList :: [Node] -> ShowS #

Show Prologue 
Instance details

Defined in Data.XML.Types

Show ParseException 
Instance details

Defined in Data.Yaml.Internal

Show Warning 
Instance details

Defined in Data.Yaml.Internal

Show CompressionLevel 
Instance details

Defined in Codec.Compression.Zlib.Stream

Show CompressionStrategy 
Instance details

Defined in Codec.Compression.Zlib.Stream

Show DictionaryHash 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

showsPrec :: Int -> DictionaryHash -> ShowS #

show :: DictionaryHash -> String #

showList :: [DictionaryHash] -> ShowS #

Show Format 
Instance details

Defined in Codec.Compression.Zlib.Stream

Show MemoryLevel 
Instance details

Defined in Codec.Compression.Zlib.Stream

Show Method 
Instance details

Defined in Codec.Compression.Zlib.Stream

Show WindowBits 
Instance details

Defined in Codec.Compression.Zlib.Stream

Show Integer

Since: base-2.1

Instance details

Defined in GHC.Show

Show Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Show

Show ()

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> () -> ShowS #

show :: () -> String #

showList :: [()] -> ShowS #

Show Bool

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Bool -> ShowS #

show :: Bool -> String #

showList :: [Bool] -> ShowS #

Show Char

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Char -> ShowS #

show :: Char -> String #

showList :: [Char] -> ShowS #

Show Int

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Int -> ShowS #

show :: Int -> String #

showList :: [Int] -> ShowS #

Show Levity

Since: base-4.15.0.0

Instance details

Defined in GHC.Show

Show RuntimeRep

Since: base-4.11.0.0

Instance details

Defined in GHC.Show

Show VecCount

Since: base-4.11.0.0

Instance details

Defined in GHC.Show

Show VecElem

Since: base-4.11.0.0

Instance details

Defined in GHC.Show

Show Word

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Word -> ShowS #

show :: Word -> String #

showList :: [Word] -> ShowS #

Show (Blind a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> Blind a -> ShowS #

show :: Blind a -> String #

showList :: [Blind a] -> ShowS #

Show a => Show (Fixed a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> Fixed a -> ShowS #

show :: Fixed a -> String #

showList :: [Fixed a] -> ShowS #

Show a => Show (InfiniteList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Show a => Show (Large a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> Large a -> ShowS #

show :: Large a -> String #

showList :: [Large a] -> ShowS #

Show a => Show (Negative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> Negative a -> ShowS #

show :: Negative a -> String #

showList :: [Negative a] -> ShowS #

Show a => Show (NonEmptyList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Show a => Show (NonNegative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Show a => Show (NonPositive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Show a => Show (NonZero a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> NonZero a -> ShowS #

show :: NonZero a -> String #

showList :: [NonZero a] -> ShowS #

Show a => Show (OrderedList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Show a => Show (Positive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> Positive a -> ShowS #

show :: Positive a -> String #

showList :: [Positive a] -> ShowS #

Show a => Show (Shrink2 a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> Shrink2 a -> ShowS #

show :: Shrink2 a -> String #

showList :: [Shrink2 a] -> ShowS #

Show a => Show (Small a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> Small a -> ShowS #

show :: Small a -> String #

showList :: [Small a] -> ShowS #

Show a => Show (Smart a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> Smart a -> ShowS #

show :: Smart a -> String #

showList :: [Smart a] -> ShowS #

Show a => Show (SortedList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Show (Encoding' a) 
Instance details

Defined in Data.Aeson.Encoding.Internal

Show v => Show (KeyMap v) 
Instance details

Defined in Data.Aeson.KeyMap

Methods

showsPrec :: Int -> KeyMap v -> ShowS #

show :: KeyMap v -> String #

showList :: [KeyMap v] -> ShowS #

Show a => Show (IResult a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

showsPrec :: Int -> IResult a -> ShowS #

show :: IResult a -> String #

showList :: [IResult a] -> ShowS #

Show a => Show (Result a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

showsPrec :: Int -> Result a -> ShowS #

show :: Result a -> String #

showList :: [Result a] -> ShowS #

Show (Path a) 
Instance details

Defined in Amazonka.Data.Path

Methods

showsPrec :: Int -> Path a -> ShowS #

show :: Path a -> String #

showList :: [Path a] -> ShowS #

Show (Sensitive a) 
Instance details

Defined in Amazonka.Data.Sensitive

Show (Time a) 
Instance details

Defined in Amazonka.Data.Time

Methods

showsPrec :: Int -> Time a -> ShowS #

show :: Time a -> String #

showList :: [Time a] -> ShowS #

Show a => Show (ZipList a)

Since: base-4.7.0.0

Instance details

Defined in Control.Applicative

Methods

showsPrec :: Int -> ZipList a -> ShowS #

show :: ZipList a -> String #

showList :: [ZipList a] -> ShowS #

Show a => Show (Complex a)

Since: base-2.1

Instance details

Defined in Data.Complex

Methods

showsPrec :: Int -> Complex a -> ShowS #

show :: Complex a -> String #

showList :: [Complex a] -> ShowS #

Show a => Show (Identity a)

This instance would be equivalent to the derived instances of the Identity newtype if the runIdentity field were removed

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

showsPrec :: Int -> Identity a -> ShowS #

show :: Identity a -> String #

showList :: [Identity a] -> ShowS #

Show a => Show (First a)

Since: base-2.1

Instance details

Defined in Data.Monoid

Methods

showsPrec :: Int -> First a -> ShowS #

show :: First a -> String #

showList :: [First a] -> ShowS #

Show a => Show (Last a)

Since: base-2.1

Instance details

Defined in Data.Monoid

Methods

showsPrec :: Int -> Last a -> ShowS #

show :: Last a -> String #

showList :: [Last a] -> ShowS #

Show a => Show (Down a)

This instance would be equivalent to the derived instances of the Down newtype if the getDown field were removed

Since: base-4.7.0.0

Instance details

Defined in Data.Ord

Methods

showsPrec :: Int -> Down a -> ShowS #

show :: Down a -> String #

showList :: [Down a] -> ShowS #

Show a => Show (First a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

showsPrec :: Int -> First a -> ShowS #

show :: First a -> String #

showList :: [First a] -> ShowS #

Show a => Show (Last a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

showsPrec :: Int -> Last a -> ShowS #

show :: Last a -> String #

showList :: [Last a] -> ShowS #

Show a => Show (Max a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

showsPrec :: Int -> Max a -> ShowS #

show :: Max a -> String #

showList :: [Max a] -> ShowS #

Show a => Show (Min a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

showsPrec :: Int -> Min a -> ShowS #

show :: Min a -> String #

showList :: [Min a] -> ShowS #

Show m => Show (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Show a => Show (Dual a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

showsPrec :: Int -> Dual a -> ShowS #

show :: Dual a -> String #

showList :: [Dual a] -> ShowS #

Show a => Show (Product a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

showsPrec :: Int -> Product a -> ShowS #

show :: Product a -> String #

showList :: [Product a] -> ShowS #

Show a => Show (Sum a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

showsPrec :: Int -> Sum a -> ShowS #

show :: Sum a -> String #

showList :: [Sum a] -> ShowS #

Show (ForeignPtr a)

Since: base-2.1

Instance details

Defined in GHC.ForeignPtr

Show p => Show (Par1 p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> Par1 p -> ShowS #

show :: Par1 p -> String #

showList :: [Par1 p] -> ShowS #

Show (FunPtr a)

Since: base-2.1

Instance details

Defined in GHC.Ptr

Methods

showsPrec :: Int -> FunPtr a -> ShowS #

show :: FunPtr a -> String #

showList :: [FunPtr a] -> ShowS #

Show (Ptr a)

Since: base-2.1

Instance details

Defined in GHC.Ptr

Methods

showsPrec :: Int -> Ptr a -> ShowS #

show :: Ptr a -> String #

showList :: [Ptr a] -> ShowS #

Show a => Show (Ratio a)

Since: base-2.0.1

Instance details

Defined in GHC.Real

Methods

showsPrec :: Int -> Ratio a -> ShowS #

show :: Ratio a -> String #

showList :: [Ratio a] -> ShowS #

Show (Bits n) 
Instance details

Defined in Basement.Bits

Methods

showsPrec :: Int -> Bits n -> ShowS #

show :: Bits n -> String #

showList :: [Bits n] -> ShowS #

(PrimType ty, Show ty) => Show (Block ty) 
Instance details

Defined in Basement.Block.Base

Methods

showsPrec :: Int -> Block ty -> ShowS #

show :: Block ty -> String #

showList :: [Block ty] -> ShowS #

Show (Zn n) 
Instance details

Defined in Basement.Bounded

Methods

showsPrec :: Int -> Zn n -> ShowS #

show :: Zn n -> String #

showList :: [Zn n] -> ShowS #

Show (Zn64 n) 
Instance details

Defined in Basement.Bounded

Methods

showsPrec :: Int -> Zn64 n -> ShowS #

show :: Zn64 n -> String #

showList :: [Zn64 n] -> ShowS #

Show a => Show (NonEmpty a) 
Instance details

Defined in Basement.NonEmpty

Methods

showsPrec :: Int -> NonEmpty a -> ShowS #

show :: NonEmpty a -> String #

showList :: [NonEmpty a] -> ShowS #

Show (CountOf ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

showsPrec :: Int -> CountOf ty -> ShowS #

show :: CountOf ty -> String #

showList :: [CountOf ty] -> ShowS #

Show (Offset ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

showsPrec :: Int -> Offset ty -> ShowS #

show :: Offset ty -> String #

showList :: [Offset ty] -> ShowS #

(PrimType ty, Show ty) => Show (UArray ty) 
Instance details

Defined in Basement.UArray.Base

Methods

showsPrec :: Int -> UArray ty -> ShowS #

show :: UArray ty -> String #

showList :: [UArray ty] -> ShowS #

Show a => Show (Flush a) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

showsPrec :: Int -> Flush a -> ShowS #

show :: Flush a -> String #

showList :: [Flush a] -> ShowS #

Show vertex => Show (SCC vertex)

Since: containers-0.5.9

Instance details

Defined in Data.Graph

Methods

showsPrec :: Int -> SCC vertex -> ShowS #

show :: SCC vertex -> String #

showList :: [SCC vertex] -> ShowS #

Show a => Show (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

showsPrec :: Int -> IntMap a -> ShowS #

show :: IntMap a -> String #

showList :: [IntMap a] -> ShowS #

Show a => Show (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

showsPrec :: Int -> Seq a -> ShowS #

show :: Seq a -> String #

showList :: [Seq a] -> ShowS #

Show a => Show (ViewL a) 
Instance details

Defined in Data.Sequence.Internal

Methods

showsPrec :: Int -> ViewL a -> ShowS #

show :: ViewL a -> String #

showList :: [ViewL a] -> ShowS #

Show a => Show (ViewR a) 
Instance details

Defined in Data.Sequence.Internal

Methods

showsPrec :: Int -> ViewR a -> ShowS #

show :: ViewR a -> String #

showList :: [ViewR a] -> ShowS #

Show a => Show (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

showsPrec :: Int -> Set a -> ShowS #

show :: Set a -> String #

showList :: [Set a] -> ShowS #

Show a => Show (Tree a) 
Instance details

Defined in Data.Tree

Methods

showsPrec :: Int -> Tree a -> ShowS #

show :: Tree a -> String #

showList :: [Tree a] -> ShowS #

Show a => Show (CryptoFailable a) 
Instance details

Defined in Crypto.Error.Types

Show (Blake2b bitlen) 
Instance details

Defined in Crypto.Hash.Blake2

Methods

showsPrec :: Int -> Blake2b bitlen -> ShowS #

show :: Blake2b bitlen -> String #

showList :: [Blake2b bitlen] -> ShowS #

Show (Blake2bp bitlen) 
Instance details

Defined in Crypto.Hash.Blake2

Methods

showsPrec :: Int -> Blake2bp bitlen -> ShowS #

show :: Blake2bp bitlen -> String #

showList :: [Blake2bp bitlen] -> ShowS #

Show (Blake2s bitlen) 
Instance details

Defined in Crypto.Hash.Blake2

Methods

showsPrec :: Int -> Blake2s bitlen -> ShowS #

show :: Blake2s bitlen -> String #

showList :: [Blake2s bitlen] -> ShowS #

Show (Blake2sp bitlen) 
Instance details

Defined in Crypto.Hash.Blake2

Methods

showsPrec :: Int -> Blake2sp bitlen -> ShowS #

show :: Blake2sp bitlen -> String #

showList :: [Blake2sp bitlen] -> ShowS #

Show (SHAKE128 bitlen) 
Instance details

Defined in Crypto.Hash.SHAKE

Methods

showsPrec :: Int -> SHAKE128 bitlen -> ShowS #

show :: SHAKE128 bitlen -> String #

showList :: [SHAKE128 bitlen] -> ShowS #

Show (SHAKE256 bitlen) 
Instance details

Defined in Crypto.Hash.SHAKE

Methods

showsPrec :: Int -> SHAKE256 bitlen -> ShowS #

show :: SHAKE256 bitlen -> String #

showList :: [SHAKE256 bitlen] -> ShowS #

Show (Digest a) 
Instance details

Defined in Crypto.Hash.Types

Methods

showsPrec :: Int -> Digest a -> ShowS #

show :: Digest a -> String #

showList :: [Digest a] -> ShowS #

Show1 f => Show (Fix f) 
Instance details

Defined in Data.Fix

Methods

showsPrec :: Int -> Fix f -> ShowS #

show :: Fix f -> String #

showList :: [Fix f] -> ShowS #

(Functor f, Show1 f) => Show (Mu f) 
Instance details

Defined in Data.Fix

Methods

showsPrec :: Int -> Mu f -> ShowS #

show :: Mu f -> String #

showList :: [Mu f] -> ShowS #

(Functor f, Show1 f) => Show (Nu f) 
Instance details

Defined in Data.Fix

Methods

showsPrec :: Int -> Nu f -> ShowS #

show :: Nu f -> String #

showList :: [Nu f] -> ShowS #

Show a => Show (DNonEmpty a) 
Instance details

Defined in Data.DList.DNonEmpty.Internal

Show a => Show (DList a) 
Instance details

Defined in Data.DList.Internal

Methods

showsPrec :: Int -> DList a -> ShowS #

show :: DList a -> String #

showList :: [DList a] -> ShowS #

Show a => Show (ExitCase a) 
Instance details

Defined in Control.Monad.Catch

Methods

showsPrec :: Int -> ExitCase a -> ShowS #

show :: ExitCase a -> String #

showList :: [ExitCase a] -> ShowS #

Show a => Show (RB a) 
Instance details

Defined in Data.List.Extra

Methods

showsPrec :: Int -> RB a -> ShowS #

show :: RB a -> String #

showList :: [RB a] -> ShowS #

Show a => Show (Hashed a) 
Instance details

Defined in Data.Hashable.Class

Methods

showsPrec :: Int -> Hashed a -> ShowS #

show :: Hashed a -> String #

showList :: [Hashed a] -> ShowS #

Show body => Show (HistoriedResponse body) 
Instance details

Defined in Network.HTTP.Client

Show body => Show (Response body) 
Instance details

Defined in Network.HTTP.Client.Types

Methods

showsPrec :: Int -> Response body -> ShowS #

show :: Response body -> String #

showList :: [Response body] -> ShowS #

Show a => Show (AddrRange a) 
Instance details

Defined in Data.IP.Range

Show mono => Show (NonNull mono) 
Instance details

Defined in Data.NonNull

Methods

showsPrec :: Int -> NonNull mono -> ShowS #

show :: NonNull mono -> String #

showList :: [NonNull mono] -> ShowS #

Show a => Show (OptTree a) 
Instance details

Defined in Options.Applicative.Types

Methods

showsPrec :: Int -> OptTree a -> ShowS #

show :: OptTree a -> String #

showList :: [OptTree a] -> ShowS #

Show (Option a) 
Instance details

Defined in Options.Applicative.Types

Methods

showsPrec :: Int -> Option a -> ShowS #

show :: Option a -> String #

showList :: [Option a] -> ShowS #

Show h => Show (ParserFailure h) 
Instance details

Defined in Options.Applicative.Types

Show a => Show (ParserResult a) 
Instance details

Defined in Options.Applicative.Types

Show a => Show (AnnotDetails a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Show (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

showsPrec :: Int -> Doc a -> ShowS #

show :: Doc a -> String #

showList :: [Doc a] -> ShowS #

Show a => Show (Span a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

showsPrec :: Int -> Span a -> ShowS #

show :: Span a -> String #

showList :: [Span a] -> ShowS #

Show (Doc ann)

(show doc) prettyprints document doc with defaultLayoutOptions, ignoring all annotations.

Instance details

Defined in Prettyprinter.Internal

Methods

showsPrec :: Int -> Doc ann -> ShowS #

show :: Doc ann -> String #

showList :: [Doc ann] -> ShowS #

Show ann => Show (SimpleDocStream ann) 
Instance details

Defined in Prettyprinter.Internal

Show a => Show (Array a) 
Instance details

Defined in Data.Primitive.Array

Methods

showsPrec :: Int -> Array a -> ShowS #

show :: Array a -> String #

showList :: [Array a] -> ShowS #

(Show a, Prim a) => Show (PrimArray a)

Since: primitive-0.6.4.0

Instance details

Defined in Data.Primitive.PrimArray

Show a => Show (SmallArray a) 
Instance details

Defined in Data.Primitive.SmallArray

Show g => Show (StateGen g) 
Instance details

Defined in System.Random.Internal

Methods

showsPrec :: Int -> StateGen g -> ShowS #

show :: StateGen g -> String #

showList :: [StateGen g] -> ShowS #

Show g => Show (AtomicGen g) 
Instance details

Defined in System.Random.Stateful

Show g => Show (IOGen g) 
Instance details

Defined in System.Random.Stateful

Methods

showsPrec :: Int -> IOGen g -> ShowS #

show :: IOGen g -> String #

showList :: [IOGen g] -> ShowS #

Show g => Show (STGen g) 
Instance details

Defined in System.Random.Stateful

Methods

showsPrec :: Int -> STGen g -> ShowS #

show :: STGen g -> String #

showList :: [STGen g] -> ShowS #

Show g => Show (TGen g) 
Instance details

Defined in System.Random.Stateful

Methods

showsPrec :: Int -> TGen g -> ShowS #

show :: TGen g -> String #

showList :: [TGen g] -> ShowS #

Show a => Show (OneOrListOf a) Source # 
Instance details

Defined in Stackctl.OneOrListOf

Show a => Show (Maybe a) 
Instance details

Defined in Data.Strict.Maybe

Methods

showsPrec :: Int -> Maybe a -> ShowS #

show :: Maybe a -> String #

showList :: [Maybe a] -> ShowS #

Show flag => Show (TyVarBndr flag) 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> TyVarBndr flag -> ShowS #

show :: TyVarBndr flag -> String #

showList :: [TyVarBndr flag] -> ShowS #

Show (Memoized a) 
Instance details

Defined in UnliftIO.Memoize

Methods

showsPrec :: Int -> Memoized a -> ShowS #

show :: Memoized a -> String #

showList :: [Memoized a] -> ShowS #

Show a => Show (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Methods

showsPrec :: Int -> HashSet a -> ShowS #

show :: HashSet a -> String #

showList :: [HashSet a] -> ShowS #

Show a => Show (Vector a) 
Instance details

Defined in Data.Vector

Methods

showsPrec :: Int -> Vector a -> ShowS #

show :: Vector a -> String #

showList :: [Vector a] -> ShowS #

(Show a, Prim a) => Show (Vector a) 
Instance details

Defined in Data.Vector.Primitive

Methods

showsPrec :: Int -> Vector a -> ShowS #

show :: Vector a -> String #

showList :: [Vector a] -> ShowS #

(Show a, Storable a) => Show (Vector a) 
Instance details

Defined in Data.Vector.Storable

Methods

showsPrec :: Int -> Vector a -> ShowS #

show :: Vector a -> String #

showList :: [Vector a] -> ShowS #

Show a => Show (NonEmpty a)

Since: base-4.11.0.0

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> NonEmpty a -> ShowS #

show :: NonEmpty a -> String #

showList :: [NonEmpty a] -> ShowS #

Show a => Show (Maybe a)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Maybe a -> ShowS #

show :: Maybe a -> String #

showList :: [Maybe a] -> ShowS #

Show a => Show (a)

Since: base-4.15

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a) -> ShowS #

show :: (a) -> String #

showList :: [(a)] -> ShowS #

Show a => Show [a]

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> [a] -> ShowS #

show :: [a] -> String #

showList :: [[a]] -> ShowS #

(Show a, Show b) => Show (a :-> b) 
Instance details

Defined in Test.QuickCheck.Function

Methods

showsPrec :: Int -> (a :-> b) -> ShowS #

show :: (a :-> b) -> String #

showList :: [a :-> b] -> ShowS #

(Show a, Show b) => Show (Fun a b) 
Instance details

Defined in Test.QuickCheck.Function

Methods

showsPrec :: Int -> Fun a b -> ShowS #

show :: Fun a b -> String #

showList :: [Fun a b] -> ShowS #

Show a => Show (Shrinking s a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> Shrinking s a -> ShowS #

show :: Shrinking s a -> String #

showList :: [Shrinking s a] -> ShowS #

(Show i, Show r) => Show (IResult i r) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

showsPrec :: Int -> IResult i r -> ShowS #

show :: IResult i r -> String #

showList :: [IResult i r] -> ShowS #

(Show a, Show b) => Show (Either a b)

Since: base-3.0

Instance details

Defined in Data.Either

Methods

showsPrec :: Int -> Either a b -> ShowS #

show :: Either a b -> String #

showList :: [Either a b] -> ShowS #

Show (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

showsPrec :: Int -> Proxy s -> ShowS #

show :: Proxy s -> String #

showList :: [Proxy s] -> ShowS #

(Show a, Show b) => Show (Arg a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

showsPrec :: Int -> Arg a b -> ShowS #

show :: Arg a b -> String #

showList :: [Arg a b] -> ShowS #

Show (TypeRep a) 
Instance details

Defined in Data.Typeable.Internal

Methods

showsPrec :: Int -> TypeRep a -> ShowS #

show :: TypeRep a -> String #

showList :: [TypeRep a] -> ShowS #

(Ix a, Show a, Show b) => Show (Array a b)

Since: base-2.1

Instance details

Defined in GHC.Arr

Methods

showsPrec :: Int -> Array a b -> ShowS #

show :: Array a b -> String #

showList :: [Array a b] -> ShowS #

Show (U1 p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> U1 p -> ShowS #

show :: U1 p -> String #

showList :: [U1 p] -> ShowS #

Show (V1 p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> V1 p -> ShowS #

show :: V1 p -> String #

showList :: [V1 p] -> ShowS #

Show (ST s a)

Since: base-2.1

Instance details

Defined in GHC.ST

Methods

showsPrec :: Int -> ST s a -> ShowS #

show :: ST s a -> String #

showList :: [ST s a] -> ShowS #

(Show k, Show a) => Show (Map k a) 
Instance details

Defined in Data.Map.Internal

Methods

showsPrec :: Int -> Map k a -> ShowS #

show :: Map k a -> String #

showList :: [Map k a] -> ShowS #

(Show1 f, Show a) => Show (Cofree f a) 
Instance details

Defined in Control.Comonad.Cofree

Methods

showsPrec :: Int -> Cofree f a -> ShowS #

show :: Cofree f a -> String #

showList :: [Cofree f a] -> ShowS #

(Show1 f, Show a) => Show (Free f a) 
Instance details

Defined in Control.Monad.Free

Methods

showsPrec :: Int -> Free f a -> ShowS #

show :: Free f a -> String #

showList :: [Free f a] -> ShowS #

Show (f a) => Show (Yoneda f a) 
Instance details

Defined in Data.Functor.Yoneda

Methods

showsPrec :: Int -> Yoneda f a -> ShowS #

show :: Yoneda f a -> String #

showList :: [Yoneda f a] -> ShowS #

(Show a, Show b) => Show (Either a b) 
Instance details

Defined in Data.Strict.Either

Methods

showsPrec :: Int -> Either a b -> ShowS #

show :: Either a b -> String #

showList :: [Either a b] -> ShowS #

(Show a, Show b) => Show (These a b) 
Instance details

Defined in Data.Strict.These

Methods

showsPrec :: Int -> These a b -> ShowS #

show :: These a b -> String #

showList :: [These a b] -> ShowS #

(Show a, Show b) => Show (Pair a b) 
Instance details

Defined in Data.Strict.Tuple

Methods

showsPrec :: Int -> Pair a b -> ShowS #

show :: Pair a b -> String #

showList :: [Pair a b] -> ShowS #

(Show a, Show b) => Show (These a b) 
Instance details

Defined in Data.These

Methods

showsPrec :: Int -> These a b -> ShowS #

show :: These a b -> String #

showList :: [These a b] -> ShowS #

(Show1 f, Show a) => Show (Lift f a) 
Instance details

Defined in Control.Applicative.Lift

Methods

showsPrec :: Int -> Lift f a -> ShowS #

show :: Lift f a -> String #

showList :: [Lift f a] -> ShowS #

(Show1 m, Show a) => Show (ListT m a) 
Instance details

Defined in Control.Monad.Trans.List

Methods

showsPrec :: Int -> ListT m a -> ShowS #

show :: ListT m a -> String #

showList :: [ListT m a] -> ShowS #

(Show1 m, Show a) => Show (MaybeT m a) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

showsPrec :: Int -> MaybeT m a -> ShowS #

show :: MaybeT m a -> String #

showList :: [MaybeT m a] -> ShowS #

(Show k, Show v) => Show (HashMap k v) 
Instance details

Defined in Data.HashMap.Internal

Methods

showsPrec :: Int -> HashMap k v -> ShowS #

show :: HashMap k v -> String #

showList :: [HashMap k v] -> ShowS #

(Show a, Show b) => Show (a, b)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a, b) -> ShowS #

show :: (a, b) -> String #

showList :: [(a, b)] -> ShowS #

Show a => Show (Const a b)

This instance would be equivalent to the derived instances of the Const newtype if the getConst field were removed

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Const

Methods

showsPrec :: Int -> Const a b -> ShowS #

show :: Const a b -> String #

showList :: [Const a b] -> ShowS #

Show (f a) => Show (Ap f a)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

showsPrec :: Int -> Ap f a -> ShowS #

show :: Ap f a -> String #

showList :: [Ap f a] -> ShowS #

Show (f a) => Show (Alt f a)

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

showsPrec :: Int -> Alt f a -> ShowS #

show :: Alt f a -> String #

showList :: [Alt f a] -> ShowS #

Show (a :~: b)

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Equality

Methods

showsPrec :: Int -> (a :~: b) -> ShowS #

show :: (a :~: b) -> String #

showList :: [a :~: b] -> ShowS #

Show (OrderingI a b) 
Instance details

Defined in Data.Type.Ord

Methods

showsPrec :: Int -> OrderingI a b -> ShowS #

show :: OrderingI a b -> String #

showList :: [OrderingI a b] -> ShowS #

Show (f p) => Show (Rec1 f p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> Rec1 f p -> ShowS #

show :: Rec1 f p -> String #

showList :: [Rec1 f p] -> ShowS #

Show (URec Char p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> URec Char p -> ShowS #

show :: URec Char p -> String #

showList :: [URec Char p] -> ShowS #

Show (URec Double p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> URec Double p -> ShowS #

show :: URec Double p -> String #

showList :: [URec Double p] -> ShowS #

Show (URec Float p) 
Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> URec Float p -> ShowS #

show :: URec Float p -> String #

showList :: [URec Float p] -> ShowS #

Show (URec Int p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> URec Int p -> ShowS #

show :: URec Int p -> String #

showList :: [URec Int p] -> ShowS #

Show (URec Word p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> URec Word p -> ShowS #

show :: URec Word p -> String #

showList :: [URec Word p] -> ShowS #

Show (p (Fix p a) a) => Show (Fix p a) 
Instance details

Defined in Data.Bifunctor.Fix

Methods

showsPrec :: Int -> Fix p a -> ShowS #

show :: Fix p a -> String #

showList :: [Fix p a] -> ShowS #

Show (p a a) => Show (Join p a) 
Instance details

Defined in Data.Bifunctor.Join

Methods

showsPrec :: Int -> Join p a -> ShowS #

show :: Join p a -> String #

showList :: [Join p a] -> ShowS #

(Show a, Show (f b)) => Show (CofreeF f a b) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

showsPrec :: Int -> CofreeF f a b -> ShowS #

show :: CofreeF f a b -> String #

showList :: [CofreeF f a b] -> ShowS #

Show (w (CofreeF f a (CofreeT f w a))) => Show (CofreeT f w a) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

showsPrec :: Int -> CofreeT f w a -> ShowS #

show :: CofreeT f w a -> String #

showList :: [CofreeT f w a] -> ShowS #

(Show a, Show (f b)) => Show (FreeF f a b) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

showsPrec :: Int -> FreeF f a b -> ShowS #

show :: FreeF f a b -> String #

showList :: [FreeF f a b] -> ShowS #

(Show1 f, Show1 m, Show a) => Show (FreeT f m a) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

showsPrec :: Int -> FreeT f m a -> ShowS #

show :: FreeT f m a -> String #

showList :: [FreeT f m a] -> ShowS #

Show b => Show (Tagged s b) 
Instance details

Defined in Data.Tagged

Methods

showsPrec :: Int -> Tagged s b -> ShowS #

show :: Tagged s b -> String #

showList :: [Tagged s b] -> ShowS #

(Show (f a), Show (g a), Show a) => Show (These1 f g a) 
Instance details

Defined in Data.Functor.These

Methods

showsPrec :: Int -> These1 f g a -> ShowS #

show :: These1 f g a -> String #

showList :: [These1 f g a] -> ShowS #

(Show1 f, Show a) => Show (Backwards f a) 
Instance details

Defined in Control.Applicative.Backwards

Methods

showsPrec :: Int -> Backwards f a -> ShowS #

show :: Backwards f a -> String #

showList :: [Backwards f a] -> ShowS #

(Show e, Show1 m, Show a) => Show (ErrorT e m a) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

showsPrec :: Int -> ErrorT e m a -> ShowS #

show :: ErrorT e m a -> String #

showList :: [ErrorT e m a] -> ShowS #

(Show e, Show1 m, Show a) => Show (ExceptT e m a) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

showsPrec :: Int -> ExceptT e m a -> ShowS #

show :: ExceptT e m a -> String #

showList :: [ExceptT e m a] -> ShowS #

(Show1 f, Show a) => Show (IdentityT f a) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

showsPrec :: Int -> IdentityT f a -> ShowS #

show :: IdentityT f a -> String #

showList :: [IdentityT f a] -> ShowS #

(Show w, Show1 m, Show a) => Show (WriterT w m a) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

showsPrec :: Int -> WriterT w m a -> ShowS #

show :: WriterT w m a -> String #

showList :: [WriterT w m a] -> ShowS #

(Show w, Show1 m, Show a) => Show (WriterT w m a) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

showsPrec :: Int -> WriterT w m a -> ShowS #

show :: WriterT w m a -> String #

showList :: [WriterT w m a] -> ShowS #

Show a => Show (Constant a b) 
Instance details

Defined in Data.Functor.Constant

Methods

showsPrec :: Int -> Constant a b -> ShowS #

show :: Constant a b -> String #

showList :: [Constant a b] -> ShowS #

(Show1 f, Show a) => Show (Reverse f a) 
Instance details

Defined in Data.Functor.Reverse

Methods

showsPrec :: Int -> Reverse f a -> ShowS #

show :: Reverse f a -> String #

showList :: [Reverse f a] -> ShowS #

Show (Process stdin stdout stderr) 
Instance details

Defined in System.Process.Typed

Methods

showsPrec :: Int -> Process stdin stdout stderr -> ShowS #

show :: Process stdin stdout stderr -> String #

showList :: [Process stdin stdout stderr] -> ShowS #

Show (ProcessConfig stdin stdout stderr) 
Instance details

Defined in System.Process.Typed.Internal

Methods

showsPrec :: Int -> ProcessConfig stdin stdout stderr -> ShowS #

show :: ProcessConfig stdin stdout stderr -> String #

showList :: [ProcessConfig stdin stdout stderr] -> ShowS #

(Show a, Show b, Show c) => Show (a, b, c)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a, b, c) -> ShowS #

show :: (a, b, c) -> String #

showList :: [(a, b, c)] -> ShowS #

(Show1 f, Show1 g, Show a) => Show (Product f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Product

Methods

showsPrec :: Int -> Product f g a -> ShowS #

show :: Product f g a -> String #

showList :: [Product f g a] -> ShowS #

(Show1 f, Show1 g, Show a) => Show (Sum f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Sum

Methods

showsPrec :: Int -> Sum f g a -> ShowS #

show :: Sum f g a -> String #

showList :: [Sum f g a] -> ShowS #

Show (a :~~: b)

Since: base-4.10.0.0

Instance details

Defined in Data.Type.Equality

Methods

showsPrec :: Int -> (a :~~: b) -> ShowS #

show :: (a :~~: b) -> String #

showList :: [a :~~: b] -> ShowS #

(Show (f p), Show (g p)) => Show ((f :*: g) p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> (f :*: g) p -> ShowS #

show :: (f :*: g) p -> String #

showList :: [(f :*: g) p] -> ShowS #

(Show (f p), Show (g p)) => Show ((f :+: g) p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> (f :+: g) p -> ShowS #

show :: (f :+: g) p -> String #

showList :: [(f :+: g) p] -> ShowS #

Show c => Show (K1 i c p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> K1 i c p -> ShowS #

show :: K1 i c p -> String #

showList :: [K1 i c p] -> ShowS #

(Show a, Show b, Show c, Show d) => Show (a, b, c, d)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a, b, c, d) -> ShowS #

show :: (a, b, c, d) -> String #

showList :: [(a, b, c, d)] -> ShowS #

(Show1 f, Show1 g, Show a) => Show (Compose f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

showsPrec :: Int -> Compose f g a -> ShowS #

show :: Compose f g a -> String #

showList :: [Compose f g a] -> ShowS #

Show (f (g p)) => Show ((f :.: g) p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> (f :.: g) p -> ShowS #

show :: (f :.: g) p -> String #

showList :: [(f :.: g) p] -> ShowS #

Show (f p) => Show (M1 i c f p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> M1 i c f p -> ShowS #

show :: M1 i c f p -> String #

showList :: [M1 i c f p] -> ShowS #

Show (f a) => Show (Clown f a b) 
Instance details

Defined in Data.Bifunctor.Clown

Methods

showsPrec :: Int -> Clown f a b -> ShowS #

show :: Clown f a b -> String #

showList :: [Clown f a b] -> ShowS #

Show (p b a) => Show (Flip p a b) 
Instance details

Defined in Data.Bifunctor.Flip

Methods

showsPrec :: Int -> Flip p a b -> ShowS #

show :: Flip p a b -> String #

showList :: [Flip p a b] -> ShowS #

Show (g b) => Show (Joker g a b) 
Instance details

Defined in Data.Bifunctor.Joker

Methods

showsPrec :: Int -> Joker g a b -> ShowS #

show :: Joker g a b -> String #

showList :: [Joker g a b] -> ShowS #

Show (p a b) => Show (WrappedBifunctor p a b) 
Instance details

Defined in Data.Bifunctor.Wrapped

(Show a, Show b, Show c, Show d, Show e) => Show (a, b, c, d, e)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a, b, c, d, e) -> ShowS #

show :: (a, b, c, d, e) -> String #

showList :: [(a, b, c, d, e)] -> ShowS #

(Show (f a b), Show (g a b)) => Show (Product f g a b) 
Instance details

Defined in Data.Bifunctor.Product

Methods

showsPrec :: Int -> Product f g a b -> ShowS #

show :: Product f g a b -> String #

showList :: [Product f g a b] -> ShowS #

(Show (p a b), Show (q a b)) => Show (Sum p q a b) 
Instance details

Defined in Data.Bifunctor.Sum

Methods

showsPrec :: Int -> Sum p q a b -> ShowS #

show :: Sum p q a b -> String #

showList :: [Sum p q a b] -> ShowS #

(Show a, Show b, Show c, Show d, Show e, Show f) => Show (a, b, c, d, e, f)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f) -> ShowS #

show :: (a, b, c, d, e, f) -> String #

showList :: [(a, b, c, d, e, f)] -> ShowS #

Show (f (p a b)) => Show (Tannen f p a b) 
Instance details

Defined in Data.Bifunctor.Tannen

Methods

showsPrec :: Int -> Tannen f p a b -> ShowS #

show :: Tannen f p a b -> String #

showList :: [Tannen f p a b] -> ShowS #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g) => Show (a, b, c, d, e, f, g)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g) -> ShowS #

show :: (a, b, c, d, e, f, g) -> String #

showList :: [(a, b, c, d, e, f, g)] -> ShowS #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h) => Show (a, b, c, d, e, f, g, h)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g, h) -> ShowS #

show :: (a, b, c, d, e, f, g, h) -> String #

showList :: [(a, b, c, d, e, f, g, h)] -> ShowS #

Show (p (f a) (g b)) => Show (Biff p f g a b) 
Instance details

Defined in Data.Bifunctor.Biff

Methods

showsPrec :: Int -> Biff p f g a b -> ShowS #

show :: Biff p f g a b -> String #

showList :: [Biff p f g a b] -> ShowS #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i) => Show (a, b, c, d, e, f, g, h, i)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g, h, i) -> ShowS #

show :: (a, b, c, d, e, f, g, h, i) -> String #

showList :: [(a, b, c, d, e, f, g, h, i)] -> ShowS #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j) => Show (a, b, c, d, e, f, g, h, i, j)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g, h, i, j) -> ShowS #

show :: (a, b, c, d, e, f, g, h, i, j) -> String #

showList :: [(a, b, c, d, e, f, g, h, i, j)] -> ShowS #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k) => Show (a, b, c, d, e, f, g, h, i, j, k)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g, h, i, j, k) -> ShowS #

show :: (a, b, c, d, e, f, g, h, i, j, k) -> String #

showList :: [(a, b, c, d, e, f, g, h, i, j, k)] -> ShowS #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k, Show l) => Show (a, b, c, d, e, f, g, h, i, j, k, l)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g, h, i, j, k, l) -> ShowS #

show :: (a, b, c, d, e, f, g, h, i, j, k, l) -> String #

showList :: [(a, b, c, d, e, f, g, h, i, j, k, l)] -> ShowS #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k, Show l, Show m) => Show (a, b, c, d, e, f, g, h, i, j, k, l, m)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> ShowS #

show :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> String #

showList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m)] -> ShowS #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k, Show l, Show m, Show n) => Show (a, b, c, d, e, f, g, h, i, j, k, l, m, n)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> ShowS #

show :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> String #

showList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m, n)] -> ShowS #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k, Show l, Show m, Show n, Show o) => Show (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> ShowS #

show :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> String #

showList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)] -> ShowS #

class Typeable (a :: k) #

The class Typeable allows a concrete representation of a type to be calculated.

Minimal complete definition

typeRep#

class Monad m => MonadFail (m :: Type -> Type) where #

When a value is bound in do-notation, the pattern on the left hand side of <- might not match. In this case, this class provides a function to recover.

A Monad without a MonadFail instance may only be used in conjunction with pattern that always match, such as newtypes, tuples, data types with only a single data constructor, and irrefutable patterns (~pat).

Instances of MonadFail should satisfy the following law: fail s should be a left zero for >>=,

fail s >>= f  =  fail s

If your Monad is also MonadPlus, a popular definition is

fail _ = mzero

Since: base-4.9.0.0

Methods

fail :: String -> m a #

Instances

Instances details
MonadFail IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fail :: String -> IResult a #

MonadFail Parser 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fail :: String -> Parser a #

MonadFail Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fail :: String -> Result a #

MonadFail P

Since: base-4.9.0.0

Instance details

Defined in Text.ParserCombinators.ReadP

Methods

fail :: String -> P a #

MonadFail ReadP

Since: base-4.9.0.0

Instance details

Defined in Text.ParserCombinators.ReadP

Methods

fail :: String -> ReadP a #

MonadFail DList 
Instance details

Defined in Data.DList.Internal

Methods

fail :: String -> DList a #

MonadFail IO

Since: base-4.9.0.0

Instance details

Defined in Control.Monad.Fail

Methods

fail :: String -> IO a #

MonadFail ReadM 
Instance details

Defined in Options.Applicative.Types

Methods

fail :: String -> ReadM a #

MonadFail Array 
Instance details

Defined in Data.Primitive.Array

Methods

fail :: String -> Array a #

MonadFail SmallArray 
Instance details

Defined in Data.Primitive.SmallArray

Methods

fail :: String -> SmallArray a #

MonadFail Q 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

fail :: String -> Q a #

MonadFail Vector

Since: vector-0.12.1.0

Instance details

Defined in Data.Vector

Methods

fail :: String -> Vector a #

MonadFail Stream 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

fail :: String -> Stream a #

MonadFail Maybe

Since: base-4.9.0.0

Instance details

Defined in Control.Monad.Fail

Methods

fail :: String -> Maybe a #

MonadFail []

Since: base-4.9.0.0

Instance details

Defined in Control.Monad.Fail

Methods

fail :: String -> [a] #

MonadFail (Parser i) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

fail :: String -> Parser i a #

MonadFail (ST s)

Since: base-4.11.0.0

Instance details

Defined in GHC.ST

Methods

fail :: String -> ST s a #

MonadFail m => MonadFail (LoggingT m)

Since: monad-logger-0.3.30

Instance details

Defined in Control.Monad.Logger

Methods

fail :: String -> LoggingT m a #

MonadFail m => MonadFail (NoLoggingT m)

Since: monad-logger-0.3.30

Instance details

Defined in Control.Monad.Logger

Methods

fail :: String -> NoLoggingT m a #

MonadFail m => MonadFail (ResourceT m)

Since: resourcet-1.2.2

Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

fail :: String -> ResourceT m a #

Monad m => MonadFail (ListT m) 
Instance details

Defined in Control.Monad.Trans.List

Methods

fail :: String -> ListT m a #

Monad m => MonadFail (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

fail :: String -> MaybeT m a #

MonadFail f => MonadFail (Ap f)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

fail :: String -> Ap f a #

(Functor f, MonadFail m) => MonadFail (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

fail :: String -> FreeT f m a #

MonadFail m => MonadFail (StateT s m) 
Instance details

Defined in Lens.Micro

Methods

fail :: String -> StateT s m a #

(Monoid w, MonadFail m) => MonadFail (AccumT w m) 
Instance details

Defined in Control.Monad.Trans.Accum

Methods

fail :: String -> AccumT w m a #

(Monad m, Error e) => MonadFail (ErrorT e m) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

fail :: String -> ErrorT e m a #

MonadFail m => MonadFail (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

fail :: String -> ExceptT e m a #

MonadFail m => MonadFail (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

fail :: String -> IdentityT m a #

MonadFail m => MonadFail (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

fail :: String -> ReaderT r m a #

MonadFail m => MonadFail (SelectT r m) 
Instance details

Defined in Control.Monad.Trans.Select

Methods

fail :: String -> SelectT r m a #

MonadFail m => MonadFail (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Lazy

Methods

fail :: String -> StateT s m a #

MonadFail m => MonadFail (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

fail :: String -> StateT s m a #

(Monoid w, MonadFail m) => MonadFail (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

fail :: String -> WriterT w m a #

(Monoid w, MonadFail m) => MonadFail (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

fail :: String -> WriterT w m a #

MonadFail m => MonadFail (Reverse m) 
Instance details

Defined in Data.Functor.Reverse

Methods

fail :: String -> Reverse m a #

MonadFail m => MonadFail (ConduitT i o m)

Since: conduit-1.3.1

Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

fail :: String -> ConduitT i o m a #

MonadFail m => MonadFail (ContT r m) 
Instance details

Defined in Control.Monad.Trans.Cont

Methods

fail :: String -> ContT r m a #

(Monoid w, MonadFail m) => MonadFail (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.Lazy

Methods

fail :: String -> RWST r w s m a #

(Monoid w, MonadFail m) => MonadFail (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.Strict

Methods

fail :: String -> RWST r w s m a #

class IsString a where #

Class for string-like datastructures; used by the overloaded string extension (-XOverloadedStrings in GHC).

Methods

fromString :: String -> a #

Instances

Instances details
IsString Pattern 
Instance details

Defined in System.FilePath.Glob.Base

Methods

fromString :: String -> Pattern #

IsString Key 
Instance details

Defined in Data.Aeson.Key

Methods

fromString :: String -> Key #

IsString Value 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fromString :: String -> Value #

IsString HashedBody 
Instance details

Defined in Amazonka.Data.Body

IsString RequestBody 
Instance details

Defined in Amazonka.Data.Body

IsString QueryString 
Instance details

Defined in Amazonka.Data.Query

IsString Abbrev 
Instance details

Defined in Amazonka.Types

Methods

fromString :: String -> Abbrev #

IsString AccessKey 
Instance details

Defined in Amazonka.Types

IsString ErrorCode 
Instance details

Defined in Amazonka.Types

IsString ErrorMessage 
Instance details

Defined in Amazonka.Types

IsString Region 
Instance details

Defined in Amazonka.Types

Methods

fromString :: String -> Region #

IsString RequestId 
Instance details

Defined in Amazonka.Types

IsString SecretKey 
Instance details

Defined in Amazonka.Types

IsString SessionToken 
Instance details

Defined in Amazonka.Types

IsString String 
Instance details

Defined in Basement.UTF8.Base

Methods

fromString :: String0 -> String #

IsString ByteString

Beware: fromString truncates multi-byte characters to octets. e.g. "枯朶に烏のとまりけり秋の暮" becomes �6k�nh~�Q��n�

Instance details

Defined in Data.ByteString.Internal

IsString ByteString

Beware: fromString truncates multi-byte characters to octets. e.g. "枯朶に烏のとまりけり秋の暮" becomes �6k�nh~�Q��n�

Instance details

Defined in Data.ByteString.Lazy.Internal

IsString ShortByteString

Beware: fromString truncates multi-byte characters to octets. e.g. "枯朶に烏のとまりけり秋の暮" becomes �6k�nh~�Q��n�

Instance details

Defined in Data.ByteString.Short.Internal

IsString LogStr 
Instance details

Defined in System.Log.FastLogger.LogStr

Methods

fromString :: String -> LogStr #

IsString RequestBody

Since 0.4.12

Instance details

Defined in Network.HTTP.Client.Types

IsString IP 
Instance details

Defined in Data.IP.Addr

Methods

fromString :: String -> IP #

IsString IPv4 
Instance details

Defined in Data.IP.Addr

Methods

fromString :: String -> IPv4 #

IsString IPv6 
Instance details

Defined in Data.IP.Addr

Methods

fromString :: String -> IPv6 #

IsString IPRange 
Instance details

Defined in Data.IP.Range

Methods

fromString :: String -> IPRange #

IsString Message 
Instance details

Defined in Control.Monad.Logger.Aeson.Internal

Methods

fromString :: String -> Message #

IsString Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Methods

fromString :: String -> Doc #

IsString CmdSpec

construct a ShellCommand from a string literal

Since: process-1.2.1.0

Instance details

Defined in System.Process.Common

Methods

fromString :: String -> CmdSpec #

IsString Utf8Builder

Since: rio-0.1.0.0

Instance details

Defined in RIO.Prelude.Display

IsString DirectoryOption Source # 
Instance details

Defined in Stackctl.DirectoryOption

IsString ShortText

Note: Surrogate pairs ([U+D800 .. U+DFFF]) in string literals are replaced by U+FFFD.

This matches the behaviour of IsString instance for Text.

Instance details

Defined in Data.Text.Short.Internal

IsString Content 
Instance details

Defined in Data.XML.Types

Methods

fromString :: String -> Content #

IsString Name 
Instance details

Defined in Data.XML.Types

Methods

fromString :: String -> Name #

IsString Node 
Instance details

Defined in Data.XML.Types

Methods

fromString :: String -> Node #

IsString a => IsString (Sensitive a) 
Instance details

Defined in Amazonka.Data.Sensitive

Methods

fromString :: String -> Sensitive a #

IsString a => IsString (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.String

Methods

fromString :: String -> Identity a #

a ~ Char => IsString (Seq a)

Since: containers-0.5.7

Instance details

Defined in Data.Sequence.Internal

Methods

fromString :: String -> Seq a #

a ~ Char => IsString (DNonEmpty a) 
Instance details

Defined in Data.DList.DNonEmpty.Internal

Methods

fromString :: String -> DNonEmpty a #

a ~ Char => IsString (DList a) 
Instance details

Defined in Data.DList.Internal

Methods

fromString :: String -> DList a #

(IsString a, Hashable a) => IsString (Hashed a) 
Instance details

Defined in Data.Hashable.Class

Methods

fromString :: String -> Hashed a #

IsString (AddrRange IPv4) 
Instance details

Defined in Data.IP.Range

IsString (AddrRange IPv6) 
Instance details

Defined in Data.IP.Range

IsString (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

fromString :: String -> Doc a #

IsString (Doc ann)
>>> pretty ("hello\nworld")
hello
world

This instance uses the Pretty Doc instance, and uses the same newline to line conversion.

Instance details

Defined in Prettyprinter.Internal

Methods

fromString :: String -> Doc ann #

a ~ Char => IsString [a]

(a ~ Char) context was introduced in 4.9.0.0

Since: base-2.1

Instance details

Defined in Data.String

Methods

fromString :: String -> [a] #

(streamType ~ 'STInput, res ~ ()) => IsString (StreamSpec streamType res)

This instance uses byteStringInput to convert a raw string into a stream of input for a child process.

Since: typed-process-0.1.0.0

Instance details

Defined in System.Process.Typed.Internal

Methods

fromString :: String -> StreamSpec streamType res #

IsString a => IsString (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.String

Methods

fromString :: String -> Const a b #

IsString a => IsString (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

fromString :: String -> Tagged s a #

(stdin ~ (), stdout ~ (), stderr ~ ()) => IsString (ProcessConfig stdin stdout stderr) 
Instance details

Defined in System.Process.Typed.Internal

Methods

fromString :: String -> ProcessConfig stdin stdout stderr #

class Functor f => Applicative (f :: Type -> Type) where #

A functor with application, providing operations to

  • embed pure expressions (pure), and
  • sequence computations and combine their results (<*> and liftA2).

A minimal complete definition must include implementations of pure and of either <*> or liftA2. If it defines both, then they must behave the same as their default definitions:

(<*>) = liftA2 id
liftA2 f x y = f <$> x <*> y

Further, any definition must satisfy the following:

Identity
pure id <*> v = v
Composition
pure (.) <*> u <*> v <*> w = u <*> (v <*> w)
Homomorphism
pure f <*> pure x = pure (f x)
Interchange
u <*> pure y = pure ($ y) <*> u

The other methods have the following default definitions, which may be overridden with equivalent specialized implementations:

As a consequence of these laws, the Functor instance for f will satisfy

It may be useful to note that supposing

forall x y. p (q x y) = f x . g y

it follows from the above that

liftA2 p (liftA2 q u v) = liftA2 f u . liftA2 g v

If f is also a Monad, it should satisfy

(which implies that pure and <*> satisfy the applicative functor laws).

Minimal complete definition

pure, ((<*>) | liftA2)

Methods

pure :: a -> f a #

Lift a value.

(<*>) :: f (a -> b) -> f a -> f b infixl 4 #

Sequential application.

A few functors support an implementation of <*> that is more efficient than the default one.

Example

Expand

Used in combination with (<$>), (<*>) can be used to build a record.

>>> data MyState = MyState {arg1 :: Foo, arg2 :: Bar, arg3 :: Baz}
>>> produceFoo :: Applicative f => f Foo
>>> produceBar :: Applicative f => f Bar
>>> produceBaz :: Applicative f => f Baz
>>> mkState :: Applicative f => f MyState
>>> mkState = MyState <$> produceFoo <*> produceBar <*> produceBaz

liftA2 :: (a -> b -> c) -> f a -> f b -> f c #

Lift a binary function to actions.

Some functors support an implementation of liftA2 that is more efficient than the default one. In particular, if fmap is an expensive operation, it is likely better to use liftA2 than to fmap over the structure and then use <*>.

This became a typeclass method in 4.10.0.0. Prior to that, it was a function defined in terms of <*> and fmap.

Example

Expand
>>> liftA2 (,) (Just 3) (Just 5)
Just (3,5)

(*>) :: f a -> f b -> f b infixl 4 #

Sequence actions, discarding the value of the first argument.

Examples

Expand

If used in conjunction with the Applicative instance for Maybe, you can chain Maybe computations, with a possible "early return" in case of Nothing.

>>> Just 2 *> Just 3
Just 3
>>> Nothing *> Just 3
Nothing

Of course a more interesting use case would be to have effectful computations instead of just returning pure values.

>>> import Data.Char
>>> import Text.ParserCombinators.ReadP
>>> let p = string "my name is " *> munch1 isAlpha <* eof
>>> readP_to_S p "my name is Simon"
[("Simon","")]

(<*) :: f a -> f b -> f a infixl 4 #

Sequence actions, discarding the value of the second argument.

Instances

Instances details
Applicative Gen 
Instance details

Defined in Test.QuickCheck.Gen

Methods

pure :: a -> Gen a #

(<*>) :: Gen (a -> b) -> Gen a -> Gen b #

liftA2 :: (a -> b -> c) -> Gen a -> Gen b -> Gen c #

(*>) :: Gen a -> Gen b -> Gen b #

(<*) :: Gen a -> Gen b -> Gen a #

Applicative Rose 
Instance details

Defined in Test.QuickCheck.Property

Methods

pure :: a -> Rose a #

(<*>) :: Rose (a -> b) -> Rose a -> Rose b #

liftA2 :: (a -> b -> c) -> Rose a -> Rose b -> Rose c #

(*>) :: Rose a -> Rose b -> Rose b #

(<*) :: Rose a -> Rose b -> Rose a #

Applicative IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

pure :: a -> IResult a #

(<*>) :: IResult (a -> b) -> IResult a -> IResult b #

liftA2 :: (a -> b -> c) -> IResult a -> IResult b -> IResult c #

(*>) :: IResult a -> IResult b -> IResult b #

(<*) :: IResult a -> IResult b -> IResult a #

Applicative Parser 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

pure :: a -> Parser a #

(<*>) :: Parser (a -> b) -> Parser a -> Parser b #

liftA2 :: (a -> b -> c) -> Parser a -> Parser b -> Parser c #

(*>) :: Parser a -> Parser b -> Parser b #

(<*) :: Parser a -> Parser b -> Parser a #

Applicative Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

pure :: a -> Result a #

(<*>) :: Result (a -> b) -> Result a -> Result b #

liftA2 :: (a -> b -> c) -> Result a -> Result b -> Result c #

(*>) :: Result a -> Result b -> Result b #

(<*) :: Result a -> Result b -> Result a #

Applicative Concurrently 
Instance details

Defined in Control.Concurrent.Async

Applicative ZipList
f <$> ZipList xs1 <*> ... <*> ZipList xsN
    = ZipList (zipWithN f xs1 ... xsN)

where zipWithN refers to the zipWith function of the appropriate arity (zipWith, zipWith3, zipWith4, ...). For example:

(\a b c -> stimes c [a, b]) <$> ZipList "abcd" <*> ZipList "567" <*> ZipList [1..]
    = ZipList (zipWith3 (\a b c -> stimes c [a, b]) "abcd" "567" [1..])
    = ZipList {getZipList = ["a5","b6b6","c7c7c7"]}

Since: base-2.1

Instance details

Defined in Control.Applicative

Methods

pure :: a -> ZipList a #

(<*>) :: ZipList (a -> b) -> ZipList a -> ZipList b #

liftA2 :: (a -> b -> c) -> ZipList a -> ZipList b -> ZipList c #

(*>) :: ZipList a -> ZipList b -> ZipList b #

(<*) :: ZipList a -> ZipList b -> ZipList a #

Applicative Complex

Since: base-4.9.0.0

Instance details

Defined in Data.Complex

Methods

pure :: a -> Complex a #

(<*>) :: Complex (a -> b) -> Complex a -> Complex b #

liftA2 :: (a -> b -> c) -> Complex a -> Complex b -> Complex c #

(*>) :: Complex a -> Complex b -> Complex b #

(<*) :: Complex a -> Complex b -> Complex a #

Applicative Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

pure :: a -> Identity a #

(<*>) :: Identity (a -> b) -> Identity a -> Identity b #

liftA2 :: (a -> b -> c) -> Identity a -> Identity b -> Identity c #

(*>) :: Identity a -> Identity b -> Identity b #

(<*) :: Identity a -> Identity b -> Identity a #

Applicative First

Since: base-4.8.0.0

Instance details

Defined in Data.Monoid

Methods

pure :: a -> First a #

(<*>) :: First (a -> b) -> First a -> First b #

liftA2 :: (a -> b -> c) -> First a -> First b -> First c #

(*>) :: First a -> First b -> First b #

(<*) :: First a -> First b -> First a #

Applicative Last

Since: base-4.8.0.0

Instance details

Defined in Data.Monoid

Methods

pure :: a -> Last a #

(<*>) :: Last (a -> b) -> Last a -> Last b #

liftA2 :: (a -> b -> c) -> Last a -> Last b -> Last c #

(*>) :: Last a -> Last b -> Last b #

(<*) :: Last a -> Last b -> Last a #

Applicative Down

Since: base-4.11.0.0

Instance details

Defined in Data.Ord

Methods

pure :: a -> Down a #

(<*>) :: Down (a -> b) -> Down a -> Down b #

liftA2 :: (a -> b -> c) -> Down a -> Down b -> Down c #

(*>) :: Down a -> Down b -> Down b #

(<*) :: Down a -> Down b -> Down a #

Applicative First

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

pure :: a -> First a #

(<*>) :: First (a -> b) -> First a -> First b #

liftA2 :: (a -> b -> c) -> First a -> First b -> First c #

(*>) :: First a -> First b -> First b #

(<*) :: First a -> First b -> First a #

Applicative Last

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

pure :: a -> Last a #

(<*>) :: Last (a -> b) -> Last a -> Last b #

liftA2 :: (a -> b -> c) -> Last a -> Last b -> Last c #

(*>) :: Last a -> Last b -> Last b #

(<*) :: Last a -> Last b -> Last a #

Applicative Max

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

pure :: a -> Max a #

(<*>) :: Max (a -> b) -> Max a -> Max b #

liftA2 :: (a -> b -> c) -> Max a -> Max b -> Max c #

(*>) :: Max a -> Max b -> Max b #

(<*) :: Max a -> Max b -> Max a #

Applicative Min

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

pure :: a -> Min a #

(<*>) :: Min (a -> b) -> Min a -> Min b #

liftA2 :: (a -> b -> c) -> Min a -> Min b -> Min c #

(*>) :: Min a -> Min b -> Min b #

(<*) :: Min a -> Min b -> Min a #

Applicative Dual

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

pure :: a -> Dual a #

(<*>) :: Dual (a -> b) -> Dual a -> Dual b #

liftA2 :: (a -> b -> c) -> Dual a -> Dual b -> Dual c #

(*>) :: Dual a -> Dual b -> Dual b #

(<*) :: Dual a -> Dual b -> Dual a #

Applicative Product

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

pure :: a -> Product a #

(<*>) :: Product (a -> b) -> Product a -> Product b #

liftA2 :: (a -> b -> c) -> Product a -> Product b -> Product c #

(*>) :: Product a -> Product b -> Product b #

(<*) :: Product a -> Product b -> Product a #

Applicative Sum

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

pure :: a -> Sum a #

(<*>) :: Sum (a -> b) -> Sum a -> Sum b #

liftA2 :: (a -> b -> c) -> Sum a -> Sum b -> Sum c #

(*>) :: Sum a -> Sum b -> Sum b #

(<*) :: Sum a -> Sum b -> Sum a #

Applicative STM

Since: base-4.8.0.0

Instance details

Defined in GHC.Conc.Sync

Methods

pure :: a -> STM a #

(<*>) :: STM (a -> b) -> STM a -> STM b #

liftA2 :: (a -> b -> c) -> STM a -> STM b -> STM c #

(*>) :: STM a -> STM b -> STM b #

(<*) :: STM a -> STM b -> STM a #

Applicative Par1

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

pure :: a -> Par1 a #

(<*>) :: Par1 (a -> b) -> Par1 a -> Par1 b #

liftA2 :: (a -> b -> c) -> Par1 a -> Par1 b -> Par1 c #

(*>) :: Par1 a -> Par1 b -> Par1 b #

(<*) :: Par1 a -> Par1 b -> Par1 a #

Applicative P

Since: base-4.5.0.0

Instance details

Defined in Text.ParserCombinators.ReadP

Methods

pure :: a -> P a #

(<*>) :: P (a -> b) -> P a -> P b #

liftA2 :: (a -> b -> c) -> P a -> P b -> P c #

(*>) :: P a -> P b -> P b #

(<*) :: P a -> P b -> P a #

Applicative ReadP

Since: base-4.6.0.0

Instance details

Defined in Text.ParserCombinators.ReadP

Methods

pure :: a -> ReadP a #

(<*>) :: ReadP (a -> b) -> ReadP a -> ReadP b #

liftA2 :: (a -> b -> c) -> ReadP a -> ReadP b -> ReadP c #

(*>) :: ReadP a -> ReadP b -> ReadP b #

(<*) :: ReadP a -> ReadP b -> ReadP a #

Applicative Put 
Instance details

Defined in Data.ByteString.Builder.Internal

Methods

pure :: a -> Put a #

(<*>) :: Put (a -> b) -> Put a -> Put b #

liftA2 :: (a -> b -> c) -> Put a -> Put b -> Put c #

(*>) :: Put a -> Put b -> Put b #

(<*) :: Put a -> Put b -> Put a #

Applicative Seq

Since: containers-0.5.4

Instance details

Defined in Data.Sequence.Internal

Methods

pure :: a -> Seq a #

(<*>) :: Seq (a -> b) -> Seq a -> Seq b #

liftA2 :: (a -> b -> c) -> Seq a -> Seq b -> Seq c #

(*>) :: Seq a -> Seq b -> Seq b #

(<*) :: Seq a -> Seq b -> Seq a #

Applicative Tree 
Instance details

Defined in Data.Tree

Methods

pure :: a -> Tree a #

(<*>) :: Tree (a -> b) -> Tree a -> Tree b #

liftA2 :: (a -> b -> c) -> Tree a -> Tree b -> Tree c #

(*>) :: Tree a -> Tree b -> Tree b #

(<*) :: Tree a -> Tree b -> Tree a #

Applicative CryptoFailable 
Instance details

Defined in Crypto.Error.Types

Applicative DNonEmpty 
Instance details

Defined in Data.DList.DNonEmpty.Internal

Methods

pure :: a -> DNonEmpty a #

(<*>) :: DNonEmpty (a -> b) -> DNonEmpty a -> DNonEmpty b #

liftA2 :: (a -> b -> c) -> DNonEmpty a -> DNonEmpty b -> DNonEmpty c #

(*>) :: DNonEmpty a -> DNonEmpty b -> DNonEmpty b #

(<*) :: DNonEmpty a -> DNonEmpty b -> DNonEmpty a #

Applicative DList 
Instance details

Defined in Data.DList.Internal

Methods

pure :: a -> DList a #

(<*>) :: DList (a -> b) -> DList a -> DList b #

liftA2 :: (a -> b -> c) -> DList a -> DList b -> DList c #

(*>) :: DList a -> DList b -> DList b #

(<*) :: DList a -> DList b -> DList a #

Applicative IO

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

pure :: a -> IO a #

(<*>) :: IO (a -> b) -> IO a -> IO b #

liftA2 :: (a -> b -> c) -> IO a -> IO b -> IO c #

(*>) :: IO a -> IO b -> IO b #

(<*) :: IO a -> IO b -> IO a #

Applicative Parser 
Instance details

Defined in Options.Applicative.Types

Methods

pure :: a -> Parser a #

(<*>) :: Parser (a -> b) -> Parser a -> Parser b #

liftA2 :: (a -> b -> c) -> Parser a -> Parser b -> Parser c #

(*>) :: Parser a -> Parser b -> Parser b #

(<*) :: Parser a -> Parser b -> Parser a #

Applicative ParserM 
Instance details

Defined in Options.Applicative.Types

Methods

pure :: a -> ParserM a #

(<*>) :: ParserM (a -> b) -> ParserM a -> ParserM b #

liftA2 :: (a -> b -> c) -> ParserM a -> ParserM b -> ParserM c #

(*>) :: ParserM a -> ParserM b -> ParserM b #

(<*) :: ParserM a -> ParserM b -> ParserM a #

Applicative ParserResult 
Instance details

Defined in Options.Applicative.Types

Applicative ReadM 
Instance details

Defined in Options.Applicative.Types

Methods

pure :: a -> ReadM a #

(<*>) :: ReadM (a -> b) -> ReadM a -> ReadM b #

liftA2 :: (a -> b -> c) -> ReadM a -> ReadM b -> ReadM c #

(*>) :: ReadM a -> ReadM b -> ReadM b #

(<*) :: ReadM a -> ReadM b -> ReadM a #

Applicative Array 
Instance details

Defined in Data.Primitive.Array

Methods

pure :: a -> Array a #

(<*>) :: Array (a -> b) -> Array a -> Array b #

liftA2 :: (a -> b -> c) -> Array a -> Array b -> Array c #

(*>) :: Array a -> Array b -> Array b #

(<*) :: Array a -> Array b -> Array a #

Applicative SmallArray 
Instance details

Defined in Data.Primitive.SmallArray

Methods

pure :: a -> SmallArray a #

(<*>) :: SmallArray (a -> b) -> SmallArray a -> SmallArray b #

liftA2 :: (a -> b -> c) -> SmallArray a -> SmallArray b -> SmallArray c #

(*>) :: SmallArray a -> SmallArray b -> SmallArray b #

(<*) :: SmallArray a -> SmallArray b -> SmallArray a #

Applicative Acquire 
Instance details

Defined in Data.Acquire.Internal

Methods

pure :: a -> Acquire a #

(<*>) :: Acquire (a -> b) -> Acquire a -> Acquire b #

liftA2 :: (a -> b -> c) -> Acquire a -> Acquire b -> Acquire c #

(*>) :: Acquire a -> Acquire b -> Acquire b #

(<*) :: Acquire a -> Acquire b -> Acquire a #

Applicative Q 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

pure :: a -> Q a #

(<*>) :: Q (a -> b) -> Q a -> Q b #

liftA2 :: (a -> b -> c) -> Q a -> Q b -> Q c #

(*>) :: Q a -> Q b -> Q b #

(<*) :: Q a -> Q b -> Q a #

Applicative Cleanup 
Instance details

Defined in System.Process.Typed.Internal

Methods

pure :: a -> Cleanup a #

(<*>) :: Cleanup (a -> b) -> Cleanup a -> Cleanup b #

liftA2 :: (a -> b -> c) -> Cleanup a -> Cleanup b -> Cleanup c #

(*>) :: Cleanup a -> Cleanup b -> Cleanup b #

(<*) :: Cleanup a -> Cleanup b -> Cleanup a #

Applicative Flat 
Instance details

Defined in UnliftIO.Internals.Async

Methods

pure :: a -> Flat a #

(<*>) :: Flat (a -> b) -> Flat a -> Flat b #

liftA2 :: (a -> b -> c) -> Flat a -> Flat b -> Flat c #

(*>) :: Flat a -> Flat b -> Flat b #

(<*) :: Flat a -> Flat b -> Flat a #

Applicative FlatApp 
Instance details

Defined in UnliftIO.Internals.Async

Methods

pure :: a -> FlatApp a #

(<*>) :: FlatApp (a -> b) -> FlatApp a -> FlatApp b #

liftA2 :: (a -> b -> c) -> FlatApp a -> FlatApp b -> FlatApp c #

(*>) :: FlatApp a -> FlatApp b -> FlatApp b #

(<*) :: FlatApp a -> FlatApp b -> FlatApp a #

Applicative Memoized 
Instance details

Defined in UnliftIO.Memoize

Methods

pure :: a -> Memoized a #

(<*>) :: Memoized (a -> b) -> Memoized a -> Memoized b #

liftA2 :: (a -> b -> c) -> Memoized a -> Memoized b -> Memoized c #

(*>) :: Memoized a -> Memoized b -> Memoized b #

(<*) :: Memoized a -> Memoized b -> Memoized a #

Applicative Vector 
Instance details

Defined in Data.Vector

Methods

pure :: a -> Vector a #

(<*>) :: Vector (a -> b) -> Vector a -> Vector b #

liftA2 :: (a -> b -> c) -> Vector a -> Vector b -> Vector c #

(*>) :: Vector a -> Vector b -> Vector b #

(<*) :: Vector a -> Vector b -> Vector a #

Applicative Id 
Instance details

Defined in Data.Vector.Fusion.Util

Methods

pure :: a -> Id a #

(<*>) :: Id (a -> b) -> Id a -> Id b #

liftA2 :: (a -> b -> c) -> Id a -> Id b -> Id c #

(*>) :: Id a -> Id b -> Id b #

(<*) :: Id a -> Id b -> Id a #

Applicative Stream 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

pure :: a -> Stream a #

(<*>) :: Stream (a -> b) -> Stream a -> Stream b #

liftA2 :: (a -> b -> c) -> Stream a -> Stream b -> Stream c #

(*>) :: Stream a -> Stream b -> Stream b #

(<*) :: Stream a -> Stream b -> Stream a #

Applicative NonEmpty

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

pure :: a -> NonEmpty a #

(<*>) :: NonEmpty (a -> b) -> NonEmpty a -> NonEmpty b #

liftA2 :: (a -> b -> c) -> NonEmpty a -> NonEmpty b -> NonEmpty c #

(*>) :: NonEmpty a -> NonEmpty b -> NonEmpty b #

(<*) :: NonEmpty a -> NonEmpty b -> NonEmpty a #

Applicative Maybe

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

pure :: a -> Maybe a #

(<*>) :: Maybe (a -> b) -> Maybe a -> Maybe b #

liftA2 :: (a -> b -> c) -> Maybe a -> Maybe b -> Maybe c #

(*>) :: Maybe a -> Maybe b -> Maybe b #

(<*) :: Maybe a -> Maybe b -> Maybe a #

Applicative Solo

Since: base-4.15

Instance details

Defined in GHC.Base

Methods

pure :: a -> Solo a #

(<*>) :: Solo (a -> b) -> Solo a -> Solo b #

liftA2 :: (a -> b -> c) -> Solo a -> Solo b -> Solo c #

(*>) :: Solo a -> Solo b -> Solo b #

(<*) :: Solo a -> Solo b -> Solo a #

Applicative []

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

pure :: a -> [a] #

(<*>) :: [a -> b] -> [a] -> [b] #

liftA2 :: (a -> b -> c) -> [a] -> [b] -> [c] #

(*>) :: [a] -> [b] -> [b] #

(<*) :: [a] -> [b] -> [a] #

Representable f => Applicative (Co f) 
Instance details

Defined in Data.Functor.Rep

Methods

pure :: a -> Co f a #

(<*>) :: Co f (a -> b) -> Co f a -> Co f b #

liftA2 :: (a -> b -> c) -> Co f a -> Co f b -> Co f c #

(*>) :: Co f a -> Co f b -> Co f b #

(<*) :: Co f a -> Co f b -> Co f a #

Applicative (Parser i) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

pure :: a -> Parser i a #

(<*>) :: Parser i (a -> b) -> Parser i a -> Parser i b #

liftA2 :: (a -> b -> c) -> Parser i a -> Parser i b -> Parser i c #

(*>) :: Parser i a -> Parser i b -> Parser i b #

(<*) :: Parser i a -> Parser i b -> Parser i a #

Monad m => Applicative (WrappedMonad m)

Since: base-2.1

Instance details

Defined in Control.Applicative

Methods

pure :: a -> WrappedMonad m a #

(<*>) :: WrappedMonad m (a -> b) -> WrappedMonad m a -> WrappedMonad m b #

liftA2 :: (a -> b -> c) -> WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m c #

(*>) :: WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m b #

(<*) :: WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m a #

Arrow a => Applicative (ArrowMonad a)

Since: base-4.6.0.0

Instance details

Defined in Control.Arrow

Methods

pure :: a0 -> ArrowMonad a a0 #

(<*>) :: ArrowMonad a (a0 -> b) -> ArrowMonad a a0 -> ArrowMonad a b #

liftA2 :: (a0 -> b -> c) -> ArrowMonad a a0 -> ArrowMonad a b -> ArrowMonad a c #

(*>) :: ArrowMonad a a0 -> ArrowMonad a b -> ArrowMonad a b #

(<*) :: ArrowMonad a a0 -> ArrowMonad a b -> ArrowMonad a a0 #

Applicative (Either e)

Since: base-3.0

Instance details

Defined in Data.Either

Methods

pure :: a -> Either e a #

(<*>) :: Either e (a -> b) -> Either e a -> Either e b #

liftA2 :: (a -> b -> c) -> Either e a -> Either e b -> Either e c #

(*>) :: Either e a -> Either e b -> Either e b #

(<*) :: Either e a -> Either e b -> Either e a #

Applicative (StateL s)

Since: base-4.0

Instance details

Defined in Data.Functor.Utils

Methods

pure :: a -> StateL s a #

(<*>) :: StateL s (a -> b) -> StateL s a -> StateL s b #

liftA2 :: (a -> b -> c) -> StateL s a -> StateL s b -> StateL s c #

(*>) :: StateL s a -> StateL s b -> StateL s b #

(<*) :: StateL s a -> StateL s b -> StateL s a #

Applicative (StateR s)

Since: base-4.0

Instance details

Defined in Data.Functor.Utils

Methods

pure :: a -> StateR s a #

(<*>) :: StateR s (a -> b) -> StateR s a -> StateR s b #

liftA2 :: (a -> b -> c) -> StateR s a -> StateR s b -> StateR s c #

(*>) :: StateR s a -> StateR s b -> StateR s b #

(<*) :: StateR s a -> StateR s b -> StateR s a #

Applicative (Proxy :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

pure :: a -> Proxy a #

(<*>) :: Proxy (a -> b) -> Proxy a -> Proxy b #

liftA2 :: (a -> b -> c) -> Proxy a -> Proxy b -> Proxy c #

(*>) :: Proxy a -> Proxy b -> Proxy b #

(<*) :: Proxy a -> Proxy b -> Proxy a #

Applicative (U1 :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

pure :: a -> U1 a #

(<*>) :: U1 (a -> b) -> U1 a -> U1 b #

liftA2 :: (a -> b -> c) -> U1 a -> U1 b -> U1 c #

(*>) :: U1 a -> U1 b -> U1 b #

(<*) :: U1 a -> U1 b -> U1 a #

Applicative (ST s)

Since: base-4.4.0.0

Instance details

Defined in GHC.ST

Methods

pure :: a -> ST s a #

(<*>) :: ST s (a -> b) -> ST s a -> ST s b #

liftA2 :: (a -> b -> c) -> ST s a -> ST s b -> ST s c #

(*>) :: ST s a -> ST s b -> ST s b #

(<*) :: ST s a -> ST s b -> ST s a #

Monad m => Applicative (ZipSource m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

pure :: a -> ZipSource m a #

(<*>) :: ZipSource m (a -> b) -> ZipSource m a -> ZipSource m b #

liftA2 :: (a -> b -> c) -> ZipSource m a -> ZipSource m b -> ZipSource m c #

(*>) :: ZipSource m a -> ZipSource m b -> ZipSource m b #

(<*) :: ZipSource m a -> ZipSource m b -> ZipSource m a #

Applicative (SetM s) 
Instance details

Defined in Data.Graph

Methods

pure :: a -> SetM s a #

(<*>) :: SetM s (a -> b) -> SetM s a -> SetM s b #

liftA2 :: (a -> b -> c) -> SetM s a -> SetM s b -> SetM s c #

(*>) :: SetM s a -> SetM s b -> SetM s b #

(<*) :: SetM s a -> SetM s b -> SetM s a #

Applicative (Parser e) 
Instance details

Defined in Env.Internal.Parser

Methods

pure :: a -> Parser e a #

(<*>) :: Parser e (a -> b) -> Parser e a -> Parser e b #

liftA2 :: (a -> b -> c) -> Parser e a -> Parser e b -> Parser e c #

(*>) :: Parser e a -> Parser e b -> Parser e b #

(<*) :: Parser e a -> Parser e b -> Parser e a #

Alternative f => Applicative (Cofree f) 
Instance details

Defined in Control.Comonad.Cofree

Methods

pure :: a -> Cofree f a #

(<*>) :: Cofree f (a -> b) -> Cofree f a -> Cofree f b #

liftA2 :: (a -> b -> c) -> Cofree f a -> Cofree f b -> Cofree f c #

(*>) :: Cofree f a -> Cofree f b -> Cofree f b #

(<*) :: Cofree f a -> Cofree f b -> Cofree f a #

Functor f => Applicative (Free f) 
Instance details

Defined in Control.Monad.Free

Methods

pure :: a -> Free f a #

(<*>) :: Free f (a -> b) -> Free f a -> Free f b #

liftA2 :: (a -> b -> c) -> Free f a -> Free f b -> Free f c #

(*>) :: Free f a -> Free f b -> Free f b #

(<*) :: Free f a -> Free f b -> Free f a #

Applicative f => Applicative (Yoneda f) 
Instance details

Defined in Data.Functor.Yoneda

Methods

pure :: a -> Yoneda f a #

(<*>) :: Yoneda f (a -> b) -> Yoneda f a -> Yoneda f b #

liftA2 :: (a -> b -> c) -> Yoneda f a -> Yoneda f b -> Yoneda f c #

(*>) :: Yoneda f a -> Yoneda f b -> Yoneda f b #

(<*) :: Yoneda f a -> Yoneda f b -> Yoneda f a #

Applicative f => Applicative (Indexing f) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

pure :: a -> Indexing f a #

(<*>) :: Indexing f (a -> b) -> Indexing f a -> Indexing f b #

liftA2 :: (a -> b -> c) -> Indexing f a -> Indexing f b -> Indexing f c #

(*>) :: Indexing f a -> Indexing f b -> Indexing f b #

(<*) :: Indexing f a -> Indexing f b -> Indexing f a #

Applicative f => Applicative (Indexing64 f) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

pure :: a -> Indexing64 f a #

(<*>) :: Indexing64 f (a -> b) -> Indexing64 f a -> Indexing64 f b #

liftA2 :: (a -> b -> c) -> Indexing64 f a -> Indexing64 f b -> Indexing64 f c #

(*>) :: Indexing64 f a -> Indexing64 f b -> Indexing64 f b #

(<*) :: Indexing64 f a -> Indexing64 f b -> Indexing64 f a #

Applicative (ReifiedFold s) 
Instance details

Defined in Control.Lens.Reified

Methods

pure :: a -> ReifiedFold s a #

(<*>) :: ReifiedFold s (a -> b) -> ReifiedFold s a -> ReifiedFold s b #

liftA2 :: (a -> b -> c) -> ReifiedFold s a -> ReifiedFold s b -> ReifiedFold s c #

(*>) :: ReifiedFold s a -> ReifiedFold s b -> ReifiedFold s b #

(<*) :: ReifiedFold s a -> ReifiedFold s b -> ReifiedFold s a #

Applicative (ReifiedGetter s) 
Instance details

Defined in Control.Lens.Reified

Methods

pure :: a -> ReifiedGetter s a #

(<*>) :: ReifiedGetter s (a -> b) -> ReifiedGetter s a -> ReifiedGetter s b #

liftA2 :: (a -> b -> c) -> ReifiedGetter s a -> ReifiedGetter s b -> ReifiedGetter s c #

(*>) :: ReifiedGetter s a -> ReifiedGetter s b -> ReifiedGetter s b #

(<*) :: ReifiedGetter s a -> ReifiedGetter s b -> ReifiedGetter s a #

Applicative m => Applicative (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

pure :: a -> LoggingT m a #

(<*>) :: LoggingT m (a -> b) -> LoggingT m a -> LoggingT m b #

liftA2 :: (a -> b -> c) -> LoggingT m a -> LoggingT m b -> LoggingT m c #

(*>) :: LoggingT m a -> LoggingT m b -> LoggingT m b #

(<*) :: LoggingT m a -> LoggingT m b -> LoggingT m a #

Applicative m => Applicative (NoLoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

pure :: a -> NoLoggingT m a #

(<*>) :: NoLoggingT m (a -> b) -> NoLoggingT m a -> NoLoggingT m b #

liftA2 :: (a -> b -> c) -> NoLoggingT m a -> NoLoggingT m b -> NoLoggingT m c #

(*>) :: NoLoggingT m a -> NoLoggingT m b -> NoLoggingT m b #

(<*) :: NoLoggingT m a -> NoLoggingT m b -> NoLoggingT m a #

Applicative m => Applicative (WriterLoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

pure :: a -> WriterLoggingT m a #

(<*>) :: WriterLoggingT m (a -> b) -> WriterLoggingT m a -> WriterLoggingT m b #

liftA2 :: (a -> b -> c) -> WriterLoggingT m a -> WriterLoggingT m b -> WriterLoggingT m c #

(*>) :: WriterLoggingT m a -> WriterLoggingT m b -> WriterLoggingT m b #

(<*) :: WriterLoggingT m a -> WriterLoggingT m b -> WriterLoggingT m a #

Applicative f => Applicative (WrappedPoly f) 
Instance details

Defined in Data.MonoTraversable

Methods

pure :: a -> WrappedPoly f a #

(<*>) :: WrappedPoly f (a -> b) -> WrappedPoly f a -> WrappedPoly f b #

liftA2 :: (a -> b -> c) -> WrappedPoly f a -> WrappedPoly f b -> WrappedPoly f c #

(*>) :: WrappedPoly f a -> WrappedPoly f b -> WrappedPoly f b #

(<*) :: WrappedPoly f a -> WrappedPoly f b -> WrappedPoly f a #

Applicative m => Applicative (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

pure :: a -> ResourceT m a #

(<*>) :: ResourceT m (a -> b) -> ResourceT m a -> ResourceT m b #

liftA2 :: (a -> b -> c) -> ResourceT m a -> ResourceT m b -> ResourceT m c #

(*>) :: ResourceT m a -> ResourceT m b -> ResourceT m b #

(<*) :: ResourceT m a -> ResourceT m b -> ResourceT m a #

Applicative (RIO env) 
Instance details

Defined in RIO.Prelude.RIO

Methods

pure :: a -> RIO env a #

(<*>) :: RIO env (a -> b) -> RIO env a -> RIO env b #

liftA2 :: (a -> b -> c) -> RIO env a -> RIO env b -> RIO env c #

(*>) :: RIO env a -> RIO env b -> RIO env b #

(<*) :: RIO env a -> RIO env b -> RIO env a #

Semigroup a => Applicative (These a) 
Instance details

Defined in Data.Strict.These

Methods

pure :: a0 -> These a a0 #

(<*>) :: These a (a0 -> b) -> These a a0 -> These a b #

liftA2 :: (a0 -> b -> c) -> These a a0 -> These a b -> These a c #

(*>) :: These a a0 -> These a b -> These a b #

(<*) :: These a a0 -> These a b -> These a a0 #

Semigroup a => Applicative (These a) 
Instance details

Defined in Data.These

Methods

pure :: a0 -> These a a0 #

(<*>) :: These a (a0 -> b) -> These a a0 -> These a b #

liftA2 :: (a0 -> b -> c) -> These a a0 -> These a b -> These a c #

(*>) :: These a a0 -> These a b -> These a b #

(<*) :: These a a0 -> These a b -> These a a0 #

Applicative f => Applicative (Lift f)

A combination is Pure only if both parts are.

Instance details

Defined in Control.Applicative.Lift

Methods

pure :: a -> Lift f a #

(<*>) :: Lift f (a -> b) -> Lift f a -> Lift f b #

liftA2 :: (a -> b -> c) -> Lift f a -> Lift f b -> Lift f c #

(*>) :: Lift f a -> Lift f b -> Lift f b #

(<*) :: Lift f a -> Lift f b -> Lift f a #

Applicative m => Applicative (ListT m) 
Instance details

Defined in Control.Monad.Trans.List

Methods

pure :: a -> ListT m a #

(<*>) :: ListT m (a -> b) -> ListT m a -> ListT m b #

liftA2 :: (a -> b -> c) -> ListT m a -> ListT m b -> ListT m c #

(*>) :: ListT m a -> ListT m b -> ListT m b #

(<*) :: ListT m a -> ListT m b -> ListT m a #

(Functor m, Monad m) => Applicative (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

pure :: a -> MaybeT m a #

(<*>) :: MaybeT m (a -> b) -> MaybeT m a -> MaybeT m b #

liftA2 :: (a -> b -> c) -> MaybeT m a -> MaybeT m b -> MaybeT m c #

(*>) :: MaybeT m a -> MaybeT m b -> MaybeT m b #

(<*) :: MaybeT m a -> MaybeT m b -> MaybeT m a #

MonadUnliftIO m => Applicative (Conc m)

Since: unliftio-0.2.9.0

Instance details

Defined in UnliftIO.Internals.Async

Methods

pure :: a -> Conc m a #

(<*>) :: Conc m (a -> b) -> Conc m a -> Conc m b #

liftA2 :: (a -> b -> c) -> Conc m a -> Conc m b -> Conc m c #

(*>) :: Conc m a -> Conc m b -> Conc m b #

(<*) :: Conc m a -> Conc m b -> Conc m a #

MonadUnliftIO m => Applicative (Concurrently m)

Since: unliftio-0.1.0.0

Instance details

Defined in UnliftIO.Internals.Async

Methods

pure :: a -> Concurrently m a #

(<*>) :: Concurrently m (a -> b) -> Concurrently m a -> Concurrently m b #

liftA2 :: (a -> b -> c) -> Concurrently m a -> Concurrently m b -> Concurrently m c #

(*>) :: Concurrently m a -> Concurrently m b -> Concurrently m b #

(<*) :: Concurrently m a -> Concurrently m b -> Concurrently m a #

Monoid a => Applicative ((,) a)

For tuples, the Monoid constraint on a determines how the first values merge. For example, Strings concatenate:

("hello ", (+15)) <*> ("world!", 2002)
("hello world!",2017)

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

pure :: a0 -> (a, a0) #

(<*>) :: (a, a0 -> b) -> (a, a0) -> (a, b) #

liftA2 :: (a0 -> b -> c) -> (a, a0) -> (a, b) -> (a, c) #

(*>) :: (a, a0) -> (a, b) -> (a, b) #

(<*) :: (a, a0) -> (a, b) -> (a, a0) #

Arrow a => Applicative (WrappedArrow a b)

Since: base-2.1

Instance details

Defined in Control.Applicative

Methods

pure :: a0 -> WrappedArrow a b a0 #

(<*>) :: WrappedArrow a b (a0 -> b0) -> WrappedArrow a b a0 -> WrappedArrow a b b0 #

liftA2 :: (a0 -> b0 -> c) -> WrappedArrow a b a0 -> WrappedArrow a b b0 -> WrappedArrow a b c #

(*>) :: WrappedArrow a b a0 -> WrappedArrow a b b0 -> WrappedArrow a b b0 #

(<*) :: WrappedArrow a b a0 -> WrappedArrow a b b0 -> WrappedArrow a b a0 #

Applicative m => Applicative (Kleisli m a)

Since: base-4.14.0.0

Instance details

Defined in Control.Arrow

Methods

pure :: a0 -> Kleisli m a a0 #

(<*>) :: Kleisli m a (a0 -> b) -> Kleisli m a a0 -> Kleisli m a b #

liftA2 :: (a0 -> b -> c) -> Kleisli m a a0 -> Kleisli m a b -> Kleisli m a c #

(*>) :: Kleisli m a a0 -> Kleisli m a b -> Kleisli m a b #

(<*) :: Kleisli m a a0 -> Kleisli m a b -> Kleisli m a a0 #

Monoid m => Applicative (Const m :: Type -> Type)

Since: base-2.0.1

Instance details

Defined in Data.Functor.Const

Methods

pure :: a -> Const m a #

(<*>) :: Const m (a -> b) -> Const m a -> Const m b #

liftA2 :: (a -> b -> c) -> Const m a -> Const m b -> Const m c #

(*>) :: Const m a -> Const m b -> Const m b #

(<*) :: Const m a -> Const m b -> Const m a #

Applicative f => Applicative (Ap f)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

pure :: a -> Ap f a #

(<*>) :: Ap f (a -> b) -> Ap f a -> Ap f b #

liftA2 :: (a -> b -> c) -> Ap f a -> Ap f b -> Ap f c #

(*>) :: Ap f a -> Ap f b -> Ap f b #

(<*) :: Ap f a -> Ap f b -> Ap f a #

Applicative f => Applicative (Alt f)

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

pure :: a -> Alt f a #

(<*>) :: Alt f (a -> b) -> Alt f a -> Alt f b #

liftA2 :: (a -> b -> c) -> Alt f a -> Alt f b -> Alt f c #

(*>) :: Alt f a -> Alt f b -> Alt f b #

(<*) :: Alt f a -> Alt f b -> Alt f a #

Applicative f => Applicative (Rec1 f)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

pure :: a -> Rec1 f a #

(<*>) :: Rec1 f (a -> b) -> Rec1 f a -> Rec1 f b #

liftA2 :: (a -> b -> c) -> Rec1 f a -> Rec1 f b -> Rec1 f c #

(*>) :: Rec1 f a -> Rec1 f b -> Rec1 f b #

(<*) :: Rec1 f a -> Rec1 f b -> Rec1 f a #

Applicative (Mag a b) 
Instance details

Defined in Data.Biapplicative

Methods

pure :: a0 -> Mag a b a0 #

(<*>) :: Mag a b (a0 -> b0) -> Mag a b a0 -> Mag a b b0 #

liftA2 :: (a0 -> b0 -> c) -> Mag a b a0 -> Mag a b b0 -> Mag a b c #

(*>) :: Mag a b a0 -> Mag a b b0 -> Mag a b b0 #

(<*) :: Mag a b a0 -> Mag a b b0 -> Mag a b a0 #

Biapplicative p => Applicative (Fix p) 
Instance details

Defined in Data.Bifunctor.Fix

Methods

pure :: a -> Fix p a #

(<*>) :: Fix p (a -> b) -> Fix p a -> Fix p b #

liftA2 :: (a -> b -> c) -> Fix p a -> Fix p b -> Fix p c #

(*>) :: Fix p a -> Fix p b -> Fix p b #

(<*) :: Fix p a -> Fix p b -> Fix p a #

Biapplicative p => Applicative (Join p) 
Instance details

Defined in Data.Bifunctor.Join

Methods

pure :: a -> Join p a #

(<*>) :: Join p (a -> b) -> Join p a -> Join p b #

liftA2 :: (a -> b -> c) -> Join p a -> Join p b -> Join p c #

(*>) :: Join p a -> Join p b -> Join p b #

(<*) :: Join p a -> Join p b -> Join p a #

Monad m => Applicative (ZipSink i m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

pure :: a -> ZipSink i m a #

(<*>) :: ZipSink i m (a -> b) -> ZipSink i m a -> ZipSink i m b #

liftA2 :: (a -> b -> c) -> ZipSink i m a -> ZipSink i m b -> ZipSink i m c #

(*>) :: ZipSink i m a -> ZipSink i m b -> ZipSink i m b #

(<*) :: ZipSink i m a -> ZipSink i m b -> ZipSink i m a #

(Applicative f, Monad f) => Applicative (WhenMissing f x)

Equivalent to ReaderT k (ReaderT x (MaybeT f)).

Since: containers-0.5.9

Instance details

Defined in Data.IntMap.Internal

Methods

pure :: a -> WhenMissing f x a #

(<*>) :: WhenMissing f x (a -> b) -> WhenMissing f x a -> WhenMissing f x b #

liftA2 :: (a -> b -> c) -> WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x c #

(*>) :: WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x b #

(<*) :: WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x a #

(Alternative f, Applicative w) => Applicative (CofreeT f w) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

pure :: a -> CofreeT f w a #

(<*>) :: CofreeT f w (a -> b) -> CofreeT f w a -> CofreeT f w b #

liftA2 :: (a -> b -> c) -> CofreeT f w a -> CofreeT f w b -> CofreeT f w c #

(*>) :: CofreeT f w a -> CofreeT f w b -> CofreeT f w b #

(<*) :: CofreeT f w a -> CofreeT f w b -> CofreeT f w a #

(Functor f, Monad m) => Applicative (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

pure :: a -> FreeT f m a #

(<*>) :: FreeT f m (a -> b) -> FreeT f m a -> FreeT f m b #

liftA2 :: (a -> b -> c) -> FreeT f m a -> FreeT f m b -> FreeT f m c #

(*>) :: FreeT f m a -> FreeT f m b -> FreeT f m b #

(<*) :: FreeT f m a -> FreeT f m b -> FreeT f m a #

(Applicative f, Applicative g) => Applicative (Day f g) 
Instance details

Defined in Data.Functor.Day

Methods

pure :: a -> Day f g a #

(<*>) :: Day f g (a -> b) -> Day f g a -> Day f g b #

liftA2 :: (a -> b -> c) -> Day f g a -> Day f g b -> Day f g c #

(*>) :: Day f g a -> Day f g b -> Day f g b #

(<*) :: Day f g a -> Day f g b -> Day f g a #

Applicative (Indexed i a) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

pure :: a0 -> Indexed i a a0 #

(<*>) :: Indexed i a (a0 -> b) -> Indexed i a a0 -> Indexed i a b #

liftA2 :: (a0 -> b -> c) -> Indexed i a a0 -> Indexed i a b -> Indexed i a c #

(*>) :: Indexed i a a0 -> Indexed i a b -> Indexed i a b #

(<*) :: Indexed i a a0 -> Indexed i a b -> Indexed i a a0 #

Applicative (Bazaar a b) 
Instance details

Defined in Lens.Micro

Methods

pure :: a0 -> Bazaar a b a0 #

(<*>) :: Bazaar a b (a0 -> b0) -> Bazaar a b a0 -> Bazaar a b b0 #

liftA2 :: (a0 -> b0 -> c) -> Bazaar a b a0 -> Bazaar a b b0 -> Bazaar a b c #

(*>) :: Bazaar a b a0 -> Bazaar a b b0 -> Bazaar a b b0 #

(<*) :: Bazaar a b a0 -> Bazaar a b b0 -> Bazaar a b a0 #

(Functor m, Monad m) => Applicative (StateT s m) 
Instance details

Defined in Lens.Micro

Methods

pure :: a -> StateT s m a #

(<*>) :: StateT s m (a -> b) -> StateT s m a -> StateT s m b #

liftA2 :: (a -> b -> c) -> StateT s m a -> StateT s m b -> StateT s m c #

(*>) :: StateT s m a -> StateT s m b -> StateT s m b #

(<*) :: StateT s m a -> StateT s m b -> StateT s m a #

(Monad m, Monoid r) => Applicative (Effect m r) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

pure :: a -> Effect m r a #

(<*>) :: Effect m r (a -> b) -> Effect m r a -> Effect m r b #

liftA2 :: (a -> b -> c) -> Effect m r a -> Effect m r b -> Effect m r c #

(*>) :: Effect m r a -> Effect m r b -> Effect m r b #

(<*) :: Effect m r a -> Effect m r b -> Effect m r a #

(Monad m, Monoid s) => Applicative (Focusing m s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

pure :: a -> Focusing m s a #

(<*>) :: Focusing m s (a -> b) -> Focusing m s a -> Focusing m s b #

liftA2 :: (a -> b -> c) -> Focusing m s a -> Focusing m s b -> Focusing m s c #

(*>) :: Focusing m s a -> Focusing m s b -> Focusing m s b #

(<*) :: Focusing m s a -> Focusing m s b -> Focusing m s a #

Applicative (k (May s)) => Applicative (FocusingMay k s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

pure :: a -> FocusingMay k s a #

(<*>) :: FocusingMay k s (a -> b) -> FocusingMay k s a -> FocusingMay k s b #

liftA2 :: (a -> b -> c) -> FocusingMay k s a -> FocusingMay k s b -> FocusingMay k s c #

(*>) :: FocusingMay k s a -> FocusingMay k s b -> FocusingMay k s b #

(<*) :: FocusingMay k s a -> FocusingMay k s b -> FocusingMay k s a #

(Applicative (Rep p), Representable p) => Applicative (Prep p) 
Instance details

Defined in Data.Profunctor.Rep

Methods

pure :: a -> Prep p a #

(<*>) :: Prep p (a -> b) -> Prep p a -> Prep p b #

liftA2 :: (a -> b -> c) -> Prep p a -> Prep p b -> Prep p c #

(*>) :: Prep p a -> Prep p b -> Prep p b #

(<*) :: Prep p a -> Prep p b -> Prep p a #

Applicative m => Applicative (AppT app m) Source # 
Instance details

Defined in Stackctl.CLI

Methods

pure :: a -> AppT app m a #

(<*>) :: AppT app m (a -> b) -> AppT app m a -> AppT app m b #

liftA2 :: (a -> b -> c) -> AppT app m a -> AppT app m b -> AppT app m c #

(*>) :: AppT app m a -> AppT app m b -> AppT app m b #

(<*) :: AppT app m a -> AppT app m b -> AppT app m a #

Applicative (Tagged s) 
Instance details

Defined in Data.Tagged

Methods

pure :: a -> Tagged s a #

(<*>) :: Tagged s (a -> b) -> Tagged s a -> Tagged s b #

liftA2 :: (a -> b -> c) -> Tagged s a -> Tagged s b -> Tagged s c #

(*>) :: Tagged s a -> Tagged s b -> Tagged s b #

(<*) :: Tagged s a -> Tagged s b -> Tagged s a #

Applicative f => Applicative (Backwards f)

Apply f-actions in the reverse order.

Instance details

Defined in Control.Applicative.Backwards

Methods

pure :: a -> Backwards f a #

(<*>) :: Backwards f (a -> b) -> Backwards f a -> Backwards f b #

liftA2 :: (a -> b -> c) -> Backwards f a -> Backwards f b -> Backwards f c #

(*>) :: Backwards f a -> Backwards f b -> Backwards f b #

(<*) :: Backwards f a -> Backwards f b -> Backwards f a #

(Monoid w, Functor m, Monad m) => Applicative (AccumT w m) 
Instance details

Defined in Control.Monad.Trans.Accum

Methods

pure :: a -> AccumT w m a #

(<*>) :: AccumT w m (a -> b) -> AccumT w m a -> AccumT w m b #

liftA2 :: (a -> b -> c) -> AccumT w m a -> AccumT w m b -> AccumT w m c #

(*>) :: AccumT w m a -> AccumT w m b -> AccumT w m b #

(<*) :: AccumT w m a -> AccumT w m b -> AccumT w m a #

(Functor m, Monad m) => Applicative (ErrorT e m) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

pure :: a -> ErrorT e m a #

(<*>) :: ErrorT e m (a -> b) -> ErrorT e m a -> ErrorT e m b #

liftA2 :: (a -> b -> c) -> ErrorT e m a -> ErrorT e m b -> ErrorT e m c #

(*>) :: ErrorT e m a -> ErrorT e m b -> ErrorT e m b #

(<*) :: ErrorT e m a -> ErrorT e m b -> ErrorT e m a #

(Functor m, Monad m) => Applicative (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

pure :: a -> ExceptT e m a #

(<*>) :: ExceptT e m (a -> b) -> ExceptT e m a -> ExceptT e m b #

liftA2 :: (a -> b -> c) -> ExceptT e m a -> ExceptT e m b -> ExceptT e m c #

(*>) :: ExceptT e m a -> ExceptT e m b -> ExceptT e m b #

(<*) :: ExceptT e m a -> ExceptT e m b -> ExceptT e m a #

Applicative m => Applicative (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

pure :: a -> IdentityT m a #

(<*>) :: IdentityT m (a -> b) -> IdentityT m a -> IdentityT m b #

liftA2 :: (a -> b -> c) -> IdentityT m a -> IdentityT m b -> IdentityT m c #

(*>) :: IdentityT m a -> IdentityT m b -> IdentityT m b #

(<*) :: IdentityT m a -> IdentityT m b -> IdentityT m a #

Applicative m => Applicative (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

pure :: a -> ReaderT r m a #

(<*>) :: ReaderT r m (a -> b) -> ReaderT r m a -> ReaderT r m b #

liftA2 :: (a -> b -> c) -> ReaderT r m a -> ReaderT r m b -> ReaderT r m c #

(*>) :: ReaderT r m a -> ReaderT r m b -> ReaderT r m b #

(<*) :: ReaderT r m a -> ReaderT r m b -> ReaderT r m a #

(Functor m, Monad m) => Applicative (SelectT r m) 
Instance details

Defined in Control.Monad.Trans.Select

Methods

pure :: a -> SelectT r m a #

(<*>) :: SelectT r m (a -> b) -> SelectT r m a -> SelectT r m b #

liftA2 :: (a -> b -> c) -> SelectT r m a -> SelectT r m b -> SelectT r m c #

(*>) :: SelectT r m a -> SelectT r m b -> SelectT r m b #

(<*) :: SelectT r m a -> SelectT r m b -> SelectT r m a #

(Functor m, Monad m) => Applicative (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Lazy

Methods

pure :: a -> StateT s m a #

(<*>) :: StateT s m (a -> b) -> StateT s m a -> StateT s m b #

liftA2 :: (a -> b -> c) -> StateT s m a -> StateT s m b -> StateT s m c #

(*>) :: StateT s m a -> StateT s m b -> StateT s m b #

(<*) :: StateT s m a -> StateT s m b -> StateT s m a #

(Functor m, Monad m) => Applicative (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

pure :: a -> StateT s m a #

(<*>) :: StateT s m (a -> b) -> StateT s m a -> StateT s m b #

liftA2 :: (a -> b -> c) -> StateT s m a -> StateT s m b -> StateT s m c #

(*>) :: StateT s m a -> StateT s m b -> StateT s m b #

(<*) :: StateT s m a -> StateT s m b -> StateT s m a #

(Monoid w, Applicative m) => Applicative (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

pure :: a -> WriterT w m a #

(<*>) :: WriterT w m (a -> b) -> WriterT w m a -> WriterT w m b #

liftA2 :: (a -> b -> c) -> WriterT w m a -> WriterT w m b -> WriterT w m c #

(*>) :: WriterT w m a -> WriterT w m b -> WriterT w m b #

(<*) :: WriterT w m a -> WriterT w m b -> WriterT w m a #

(Monoid w, Applicative m) => Applicative (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

pure :: a -> WriterT w m a #

(<*>) :: WriterT w m (a -> b) -> WriterT w m a -> WriterT w m b #

liftA2 :: (a -> b -> c) -> WriterT w m a -> WriterT w m b -> WriterT w m c #

(*>) :: WriterT w m a -> WriterT w m b -> WriterT w m b #

(<*) :: WriterT w m a -> WriterT w m b -> WriterT w m a #

Monoid a => Applicative (Constant a :: Type -> Type) 
Instance details

Defined in Data.Functor.Constant

Methods

pure :: a0 -> Constant a a0 #

(<*>) :: Constant a (a0 -> b) -> Constant a a0 -> Constant a b #

liftA2 :: (a0 -> b -> c) -> Constant a a0 -> Constant a b -> Constant a c #

(*>) :: Constant a a0 -> Constant a b -> Constant a b #

(<*) :: Constant a a0 -> Constant a b -> Constant a a0 #

Applicative f => Applicative (Reverse f)

Derived instance.

Instance details

Defined in Data.Functor.Reverse

Methods

pure :: a -> Reverse f a #

(<*>) :: Reverse f (a -> b) -> Reverse f a -> Reverse f b #

liftA2 :: (a -> b -> c) -> Reverse f a -> Reverse f b -> Reverse f c #

(*>) :: Reverse f a -> Reverse f b -> Reverse f b #

(<*) :: Reverse f a -> Reverse f b -> Reverse f a #

(Monoid a, Monoid b) => Applicative ((,,) a b)

Since: base-4.14.0.0

Instance details

Defined in GHC.Base

Methods

pure :: a0 -> (a, b, a0) #

(<*>) :: (a, b, a0 -> b0) -> (a, b, a0) -> (a, b, b0) #

liftA2 :: (a0 -> b0 -> c) -> (a, b, a0) -> (a, b, b0) -> (a, b, c) #

(*>) :: (a, b, a0) -> (a, b, b0) -> (a, b, b0) #

(<*) :: (a, b, a0) -> (a, b, b0) -> (a, b, a0) #

(Applicative f, Applicative g) => Applicative (Product f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Product

Methods

pure :: a -> Product f g a #

(<*>) :: Product f g (a -> b) -> Product f g a -> Product f g b #

liftA2 :: (a -> b -> c) -> Product f g a -> Product f g b -> Product f g c #

(*>) :: Product f g a -> Product f g b -> Product f g b #

(<*) :: Product f g a -> Product f g b -> Product f g a #

(Applicative f, Applicative g) => Applicative (f :*: g)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

pure :: a -> (f :*: g) a #

(<*>) :: (f :*: g) (a -> b) -> (f :*: g) a -> (f :*: g) b #

liftA2 :: (a -> b -> c) -> (f :*: g) a -> (f :*: g) b -> (f :*: g) c #

(*>) :: (f :*: g) a -> (f :*: g) b -> (f :*: g) b #

(<*) :: (f :*: g) a -> (f :*: g) b -> (f :*: g) a #

Monoid c => Applicative (K1 i c :: Type -> Type)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

pure :: a -> K1 i c a #

(<*>) :: K1 i c (a -> b) -> K1 i c a -> K1 i c b #

liftA2 :: (a -> b -> c0) -> K1 i c a -> K1 i c b -> K1 i c c0 #

(*>) :: K1 i c a -> K1 i c b -> K1 i c b #

(<*) :: K1 i c a -> K1 i c b -> K1 i c a #

Applicative (ConduitT i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

pure :: a -> ConduitT i o m a #

(<*>) :: ConduitT i o m (a -> b) -> ConduitT i o m a -> ConduitT i o m b #

liftA2 :: (a -> b -> c) -> ConduitT i o m a -> ConduitT i o m b -> ConduitT i o m c #

(*>) :: ConduitT i o m a -> ConduitT i o m b -> ConduitT i o m b #

(<*) :: ConduitT i o m a -> ConduitT i o m b -> ConduitT i o m a #

Monad m => Applicative (ZipConduit i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

pure :: a -> ZipConduit i o m a #

(<*>) :: ZipConduit i o m (a -> b) -> ZipConduit i o m a -> ZipConduit i o m b #

liftA2 :: (a -> b -> c) -> ZipConduit i o m a -> ZipConduit i o m b -> ZipConduit i o m c #

(*>) :: ZipConduit i o m a -> ZipConduit i o m b -> ZipConduit i o m b #

(<*) :: ZipConduit i o m a -> ZipConduit i o m b -> ZipConduit i o m a #

(Monad f, Applicative f) => Applicative (WhenMatched f x y)

Equivalent to ReaderT Key (ReaderT x (ReaderT y (MaybeT f)))

Since: containers-0.5.9

Instance details

Defined in Data.IntMap.Internal

Methods

pure :: a -> WhenMatched f x y a #

(<*>) :: WhenMatched f x y (a -> b) -> WhenMatched f x y a -> WhenMatched f x y b #

liftA2 :: (a -> b -> c) -> WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y c #

(*>) :: WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y b #

(<*) :: WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y a #

(Applicative f, Monad f) => Applicative (WhenMissing f k x)

Equivalent to ReaderT k (ReaderT x (MaybeT f)) .

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

pure :: a -> WhenMissing f k x a #

(<*>) :: WhenMissing f k x (a -> b) -> WhenMissing f k x a -> WhenMissing f k x b #

liftA2 :: (a -> b -> c) -> WhenMissing f k x a -> WhenMissing f k x b -> WhenMissing f k x c #

(*>) :: WhenMissing f k x a -> WhenMissing f k x b -> WhenMissing f k x b #

(<*) :: WhenMissing f k x a -> WhenMissing f k x b -> WhenMissing f k x a #

Applicative (k (Err e s)) => Applicative (FocusingErr e k s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

pure :: a -> FocusingErr e k s a #

(<*>) :: FocusingErr e k s (a -> b) -> FocusingErr e k s a -> FocusingErr e k s b #

liftA2 :: (a -> b -> c) -> FocusingErr e k s a -> FocusingErr e k s b -> FocusingErr e k s c #

(*>) :: FocusingErr e k s a -> FocusingErr e k s b -> FocusingErr e k s b #

(<*) :: FocusingErr e k s a -> FocusingErr e k s b -> FocusingErr e k s a #

Applicative (k (f s)) => Applicative (FocusingOn f k s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

pure :: a -> FocusingOn f k s a #

(<*>) :: FocusingOn f k s (a -> b) -> FocusingOn f k s a -> FocusingOn f k s b #

liftA2 :: (a -> b -> c) -> FocusingOn f k s a -> FocusingOn f k s b -> FocusingOn f k s c #

(*>) :: FocusingOn f k s a -> FocusingOn f k s b -> FocusingOn f k s b #

(<*) :: FocusingOn f k s a -> FocusingOn f k s b -> FocusingOn f k s a #

Applicative (k (s, w)) => Applicative (FocusingPlus w k s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

pure :: a -> FocusingPlus w k s a #

(<*>) :: FocusingPlus w k s (a -> b) -> FocusingPlus w k s a -> FocusingPlus w k s b #

liftA2 :: (a -> b -> c) -> FocusingPlus w k s a -> FocusingPlus w k s b -> FocusingPlus w k s c #

(*>) :: FocusingPlus w k s a -> FocusingPlus w k s b -> FocusingPlus w k s b #

(<*) :: FocusingPlus w k s a -> FocusingPlus w k s b -> FocusingPlus w k s a #

(Monad m, Monoid s, Monoid w) => Applicative (FocusingWith w m s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

pure :: a -> FocusingWith w m s a #

(<*>) :: FocusingWith w m s (a -> b) -> FocusingWith w m s a -> FocusingWith w m s b #

liftA2 :: (a -> b -> c) -> FocusingWith w m s a -> FocusingWith w m s b -> FocusingWith w m s c #

(*>) :: FocusingWith w m s a -> FocusingWith w m s b -> FocusingWith w m s b #

(<*) :: FocusingWith w m s a -> FocusingWith w m s b -> FocusingWith w m s a #

Applicative (ContT r m) 
Instance details

Defined in Control.Monad.Trans.Cont

Methods

pure :: a -> ContT r m a #

(<*>) :: ContT r m (a -> b) -> ContT r m a -> ContT r m b #

liftA2 :: (a -> b -> c) -> ContT r m a -> ContT r m b -> ContT r m c #

(*>) :: ContT r m a -> ContT r m b -> ContT r m b #

(<*) :: ContT r m a -> ContT r m b -> ContT r m a #

(Monoid a, Monoid b, Monoid c) => Applicative ((,,,) a b c)

Since: base-4.14.0.0

Instance details

Defined in GHC.Base

Methods

pure :: a0 -> (a, b, c, a0) #

(<*>) :: (a, b, c, a0 -> b0) -> (a, b, c, a0) -> (a, b, c, b0) #

liftA2 :: (a0 -> b0 -> c0) -> (a, b, c, a0) -> (a, b, c, b0) -> (a, b, c, c0) #

(*>) :: (a, b, c, a0) -> (a, b, c, b0) -> (a, b, c, b0) #

(<*) :: (a, b, c, a0) -> (a, b, c, b0) -> (a, b, c, a0) #

Applicative ((->) r)

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

pure :: a -> r -> a #

(<*>) :: (r -> (a -> b)) -> (r -> a) -> r -> b #

liftA2 :: (a -> b -> c) -> (r -> a) -> (r -> b) -> r -> c #

(*>) :: (r -> a) -> (r -> b) -> r -> b #

(<*) :: (r -> a) -> (r -> b) -> r -> a #

(Applicative f, Applicative g) => Applicative (Compose f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

pure :: a -> Compose f g a #

(<*>) :: Compose f g (a -> b) -> Compose f g a -> Compose f g b #

liftA2 :: (a -> b -> c) -> Compose f g a -> Compose f g b -> Compose f g c #

(*>) :: Compose f g a -> Compose f g b -> Compose f g b #

(<*) :: Compose f g a -> Compose f g b -> Compose f g a #

(Applicative f, Applicative g) => Applicative (f :.: g)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

pure :: a -> (f :.: g) a #

(<*>) :: (f :.: g) (a -> b) -> (f :.: g) a -> (f :.: g) b #

liftA2 :: (a -> b -> c) -> (f :.: g) a -> (f :.: g) b -> (f :.: g) c #

(*>) :: (f :.: g) a -> (f :.: g) b -> (f :.: g) b #

(<*) :: (f :.: g) a -> (f :.: g) b -> (f :.: g) a #

Applicative f => Applicative (M1 i c f)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

pure :: a -> M1 i c f a #

(<*>) :: M1 i c f (a -> b) -> M1 i c f a -> M1 i c f b #

liftA2 :: (a -> b -> c0) -> M1 i c f a -> M1 i c f b -> M1 i c f c0 #

(*>) :: M1 i c f a -> M1 i c f b -> M1 i c f b #

(<*) :: M1 i c f a -> M1 i c f b -> M1 i c f a #

(Monad f, Applicative f) => Applicative (WhenMatched f k x y)

Equivalent to ReaderT k (ReaderT x (ReaderT y (MaybeT f)))

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

pure :: a -> WhenMatched f k x y a #

(<*>) :: WhenMatched f k x y (a -> b) -> WhenMatched f k x y a -> WhenMatched f k x y b #

liftA2 :: (a -> b -> c) -> WhenMatched f k x y a -> WhenMatched f k x y b -> WhenMatched f k x y c #

(*>) :: WhenMatched f k x y a -> WhenMatched f k x y b -> WhenMatched f k x y b #

(<*) :: WhenMatched f k x y a -> WhenMatched f k x y b -> WhenMatched f k x y a #

(Monoid s, Monoid w, Monad m) => Applicative (EffectRWS w st m s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

pure :: a -> EffectRWS w st m s a #

(<*>) :: EffectRWS w st m s (a -> b) -> EffectRWS w st m s a -> EffectRWS w st m s b #

liftA2 :: (a -> b -> c) -> EffectRWS w st m s a -> EffectRWS w st m s b -> EffectRWS w st m s c #

(*>) :: EffectRWS w st m s a -> EffectRWS w st m s b -> EffectRWS w st m s b #

(<*) :: EffectRWS w st m s a -> EffectRWS w st m s b -> EffectRWS w st m s a #

Reifies s (ReifiedApplicative f) => Applicative (ReflectedApplicative f s) 
Instance details

Defined in Data.Reflection

(Monoid w, Functor m, Monad m) => Applicative (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.Lazy

Methods

pure :: a -> RWST r w s m a #

(<*>) :: RWST r w s m (a -> b) -> RWST r w s m a -> RWST r w s m b #

liftA2 :: (a -> b -> c) -> RWST r w s m a -> RWST r w s m b -> RWST r w s m c #

(*>) :: RWST r w s m a -> RWST r w s m b -> RWST r w s m b #

(<*) :: RWST r w s m a -> RWST r w s m b -> RWST r w s m a #

(Monoid w, Functor m, Monad m) => Applicative (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.Strict

Methods

pure :: a -> RWST r w s m a #

(<*>) :: RWST r w s m (a -> b) -> RWST r w s m a -> RWST r w s m b #

liftA2 :: (a -> b -> c) -> RWST r w s m a -> RWST r w s m b -> RWST r w s m c #

(*>) :: RWST r w s m a -> RWST r w s m b -> RWST r w s m b #

(<*) :: RWST r w s m a -> RWST r w s m b -> RWST r w s m a #

Monad state => Applicative (Builder collection mutCollection step state err) 
Instance details

Defined in Basement.MutableBuilder

Methods

pure :: a -> Builder collection mutCollection step state err a #

(<*>) :: Builder collection mutCollection step state err (a -> b) -> Builder collection mutCollection step state err a -> Builder collection mutCollection step state err b #

liftA2 :: (a -> b -> c) -> Builder collection mutCollection step state err a -> Builder collection mutCollection step state err b -> Builder collection mutCollection step state err c #

(*>) :: Builder collection mutCollection step state err a -> Builder collection mutCollection step state err b -> Builder collection mutCollection step state err b #

(<*) :: Builder collection mutCollection step state err a -> Builder collection mutCollection step state err b -> Builder collection mutCollection step state err a #

Monad m => Applicative (Pipe l i o u m) 
Instance details

Defined in Data.Conduit.Internal.Pipe

Methods

pure :: a -> Pipe l i o u m a #

(<*>) :: Pipe l i o u m (a -> b) -> Pipe l i o u m a -> Pipe l i o u m b #

liftA2 :: (a -> b -> c) -> Pipe l i o u m a -> Pipe l i o u m b -> Pipe l i o u m c #

(*>) :: Pipe l i o u m a -> Pipe l i o u m b -> Pipe l i o u m b #

(<*) :: Pipe l i o u m a -> Pipe l i o u m b -> Pipe l i o u m a #

class Foldable (t :: TYPE LiftedRep -> Type) where #

The Foldable class represents data structures that can be reduced to a summary value one element at a time. Strict left-associative folds are a good fit for space-efficient reduction, while lazy right-associative folds are a good fit for corecursive iteration, or for folds that short-circuit after processing an initial subsequence of the structure's elements.

Instances can be derived automatically by enabling the DeriveFoldable extension. For example, a derived instance for a binary tree might be:

{-# LANGUAGE DeriveFoldable #-}
data Tree a = Empty
            | Leaf a
            | Node (Tree a) a (Tree a)
    deriving Foldable

A more detailed description can be found in the Overview section of Data.Foldable.

For the class laws see the Laws section of Data.Foldable.

Minimal complete definition

foldMap | foldr

Methods

fold :: Monoid m => t m -> m #

Given a structure with elements whose type is a Monoid, combine them via the monoid's (<>) operator. This fold is right-associative and lazy in the accumulator. When you need a strict left-associative fold, use foldMap' instead, with id as the map.

Examples

Expand

Basic usage:

>>> fold [[1, 2, 3], [4, 5], [6], []]
[1,2,3,4,5,6]
>>> fold $ Node (Leaf (Sum 1)) (Sum 3) (Leaf (Sum 5))
Sum {getSum = 9}

Folds of unbounded structures do not terminate when the monoid's (<>) operator is strict:

>>> fold (repeat Nothing)
* Hangs forever *

Lazy corecursive folds of unbounded structures are fine:

>>> take 12 $ fold $ map (\i -> [i..i+2]) [0..]
[0,1,2,1,2,3,2,3,4,3,4,5]
>>> sum $ take 4000000 $ fold $ map (\i -> [i..i+2]) [0..]
2666668666666

foldMap :: Monoid m => (a -> m) -> t a -> m #

Map each element of the structure into a monoid, and combine the results with (<>). This fold is right-associative and lazy in the accumulator. For strict left-associative folds consider foldMap' instead.

Examples

Expand

Basic usage:

>>> foldMap Sum [1, 3, 5]
Sum {getSum = 9}
>>> foldMap Product [1, 3, 5]
Product {getProduct = 15}
>>> foldMap (replicate 3) [1, 2, 3]
[1,1,1,2,2,2,3,3,3]

When a Monoid's (<>) is lazy in its second argument, foldMap can return a result even from an unbounded structure. For example, lazy accumulation enables Data.ByteString.Builder to efficiently serialise large data structures and produce the output incrementally:

>>> import qualified Data.ByteString.Lazy as L
>>> import qualified Data.ByteString.Builder as B
>>> let bld :: Int -> B.Builder; bld i = B.intDec i <> B.word8 0x20
>>> let lbs = B.toLazyByteString $ foldMap bld [0..]
>>> L.take 64 lbs
"0 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24"

foldr :: (a -> b -> b) -> b -> t a -> b #

Right-associative fold of a structure, lazy in the accumulator.

In the case of lists, foldr, when applied to a binary operator, a starting value (typically the right-identity of the operator), and a list, reduces the list using the binary operator, from right to left:

foldr f z [x1, x2, ..., xn] == x1 `f` (x2 `f` ... (xn `f` z)...)

Note that since the head of the resulting expression is produced by an application of the operator to the first element of the list, given an operator lazy in its right argument, foldr can produce a terminating expression from an unbounded list.

For a general Foldable structure this should be semantically identical to,

foldr f z = foldr f z . toList

Examples

Expand

Basic usage:

>>> foldr (||) False [False, True, False]
True
>>> foldr (||) False []
False
>>> foldr (\c acc -> acc ++ [c]) "foo" ['a', 'b', 'c', 'd']
"foodcba"
Infinite structures

⚠️ Applying foldr to infinite structures usually doesn't terminate.

It may still terminate under one of the following conditions:

  • the folding function is short-circuiting
  • the folding function is lazy on its second argument
Short-circuiting

(||) short-circuits on True values, so the following terminates because there is a True value finitely far from the left side:

>>> foldr (||) False (True : repeat False)
True

But the following doesn't terminate:

>>> foldr (||) False (repeat False ++ [True])
* Hangs forever *
Laziness in the second argument

Applying foldr to infinite structures terminates when the operator is lazy in its second argument (the initial accumulator is never used in this case, and so could be left undefined, but [] is more clear):

>>> take 5 $ foldr (\i acc -> i : fmap (+3) acc) [] (repeat 1)
[1,4,7,10,13]

foldl' :: (b -> a -> b) -> b -> t a -> b #

Left-associative fold of a structure but with strict application of the operator.

This ensures that each step of the fold is forced to Weak Head Normal Form before being applied, avoiding the collection of thunks that would otherwise occur. This is often what you want to strictly reduce a finite structure to a single strict result (e.g. sum).

For a general Foldable structure this should be semantically identical to,

foldl' f z = foldl' f z . toList

Since: base-4.6.0.0

toList :: t a -> [a] #

List of elements of a structure, from left to right. If the entire list is intended to be reduced via a fold, just fold the structure directly bypassing the list.

Examples

Expand

Basic usage:

>>> toList Nothing
[]
>>> toList (Just 42)
[42]
>>> toList (Left "foo")
[]
>>> toList (Node (Leaf 5) 17 (Node Empty 12 (Leaf 8)))
[5,17,12,8]

For lists, toList is the identity:

>>> toList [1, 2, 3]
[1,2,3]

Since: base-4.8.0.0

null :: t a -> Bool #

Test whether the structure is empty. The default implementation is Left-associative and lazy in both the initial element and the accumulator. Thus optimised for structures where the first element can be accessed in constant time. Structures where this is not the case should have a non-default implementation.

Examples

Expand

Basic usage:

>>> null []
True
>>> null [1]
False

null is expected to terminate even for infinite structures. The default implementation terminates provided the structure is bounded on the left (there is a leftmost element).

>>> null [1..]
False

Since: base-4.8.0.0

length :: t a -> Int #

Returns the size/length of a finite structure as an Int. The default implementation just counts elements starting with the leftmost. Instances for structures that can compute the element count faster than via element-by-element counting, should provide a specialised implementation.

Examples

Expand

Basic usage:

>>> length []
0
>>> length ['a', 'b', 'c']
3
>>> length [1..]
* Hangs forever *

Since: base-4.8.0.0

elem :: Eq a => a -> t a -> Bool infix 4 #

Does the element occur in the structure?

Note: elem is often used in infix form.

Examples

Expand

Basic usage:

>>> 3 `elem` []
False
>>> 3 `elem` [1,2]
False
>>> 3 `elem` [1,2,3,4,5]
True

For infinite structures, the default implementation of elem terminates if the sought-after value exists at a finite distance from the left side of the structure:

>>> 3 `elem` [1..]
True
>>> 3 `elem` ([4..] ++ [3])
* Hangs forever *

Since: base-4.8.0.0

sum :: Num a => t a -> a #

The sum function computes the sum of the numbers of a structure.

Examples

Expand

Basic usage:

>>> sum []
0
>>> sum [42]
42
>>> sum [1..10]
55
>>> sum [4.1, 2.0, 1.7]
7.8
>>> sum [1..]
* Hangs forever *

Since: base-4.8.0.0

product :: Num a => t a -> a #

The product function computes the product of the numbers of a structure.

Examples

Expand

Basic usage:

>>> product []
1
>>> product [42]
42
>>> product [1..10]
3628800
>>> product [4.1, 2.0, 1.7]
13.939999999999998
>>> product [1..]
* Hangs forever *

Since: base-4.8.0.0

Instances

Instances details
Foldable KeyMap 
Instance details

Defined in Data.Aeson.KeyMap

Methods

fold :: Monoid m => KeyMap m -> m #

foldMap :: Monoid m => (a -> m) -> KeyMap a -> m #

foldMap' :: Monoid m => (a -> m) -> KeyMap a -> m #

foldr :: (a -> b -> b) -> b -> KeyMap a -> b #

foldr' :: (a -> b -> b) -> b -> KeyMap a -> b #

foldl :: (b -> a -> b) -> b -> KeyMap a -> b #

foldl' :: (b -> a -> b) -> b -> KeyMap a -> b #

foldr1 :: (a -> a -> a) -> KeyMap a -> a #

foldl1 :: (a -> a -> a) -> KeyMap a -> a #

toList :: KeyMap a -> [a] #

null :: KeyMap a -> Bool #

length :: KeyMap a -> Int #

elem :: Eq a => a -> KeyMap a -> Bool #

maximum :: Ord a => KeyMap a -> a #

minimum :: Ord a => KeyMap a -> a #

sum :: Num a => KeyMap a -> a #

product :: Num a => KeyMap a -> a #

Foldable IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fold :: Monoid m => IResult m -> m #

foldMap :: Monoid m => (a -> m) -> IResult a -> m #

foldMap' :: Monoid m => (a -> m) -> IResult a -> m #

foldr :: (a -> b -> b) -> b -> IResult a -> b #

foldr' :: (a -> b -> b) -> b -> IResult a -> b #

foldl :: (b -> a -> b) -> b -> IResult a -> b #

foldl' :: (b -> a -> b) -> b -> IResult a -> b #

foldr1 :: (a -> a -> a) -> IResult a -> a #

foldl1 :: (a -> a -> a) -> IResult a -> a #

toList :: IResult a -> [a] #

null :: IResult a -> Bool #

length :: IResult a -> Int #

elem :: Eq a => a -> IResult a -> Bool #

maximum :: Ord a => IResult a -> a #

minimum :: Ord a => IResult a -> a #

sum :: Num a => IResult a -> a #

product :: Num a => IResult a -> a #

Foldable Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fold :: Monoid m => Result m -> m #

foldMap :: Monoid m => (a -> m) -> Result a -> m #

foldMap' :: Monoid m => (a -> m) -> Result a -> m #

foldr :: (a -> b -> b) -> b -> Result a -> b #

foldr' :: (a -> b -> b) -> b -> Result a -> b #

foldl :: (b -> a -> b) -> b -> Result a -> b #

foldl' :: (b -> a -> b) -> b -> Result a -> b #

foldr1 :: (a -> a -> a) -> Result a -> a #

foldl1 :: (a -> a -> a) -> Result a -> a #

toList :: Result a -> [a] #

null :: Result a -> Bool #

length :: Result a -> Int #

elem :: Eq a => a -> Result a -> Bool #

maximum :: Ord a => Result a -> a #

minimum :: Ord a => Result a -> a #

sum :: Num a => Result a -> a #

product :: Num a => Result a -> a #

Foldable ZipList

Since: base-4.9.0.0

Instance details

Defined in Control.Applicative

Methods

fold :: Monoid m => ZipList m -> m #

foldMap :: Monoid m => (a -> m) -> ZipList a -> m #

foldMap' :: Monoid m => (a -> m) -> ZipList a -> m #

foldr :: (a -> b -> b) -> b -> ZipList a -> b #

foldr' :: (a -> b -> b) -> b -> ZipList a -> b #

foldl :: (b -> a -> b) -> b -> ZipList a -> b #

foldl' :: (b -> a -> b) -> b -> ZipList a -> b #

foldr1 :: (a -> a -> a) -> ZipList a -> a #

foldl1 :: (a -> a -> a) -> ZipList a -> a #

toList :: ZipList a -> [a] #

null :: ZipList a -> Bool #

length :: ZipList a -> Int #

elem :: Eq a => a -> ZipList a -> Bool #

maximum :: Ord a => ZipList a -> a #

minimum :: Ord a => ZipList a -> a #

sum :: Num a => ZipList a -> a #

product :: Num a => ZipList a -> a #

Foldable Complex

Since: base-4.9.0.0

Instance details

Defined in Data.Complex

Methods

fold :: Monoid m => Complex m -> m #

foldMap :: Monoid m => (a -> m) -> Complex a -> m #

foldMap' :: Monoid m => (a -> m) -> Complex a -> m #

foldr :: (a -> b -> b) -> b -> Complex a -> b #

foldr' :: (a -> b -> b) -> b -> Complex a -> b #

foldl :: (b -> a -> b) -> b -> Complex a -> b #

foldl' :: (b -> a -> b) -> b -> Complex a -> b #

foldr1 :: (a -> a -> a) -> Complex a -> a #

foldl1 :: (a -> a -> a) -> Complex a -> a #

toList :: Complex a -> [a] #

null :: Complex a -> Bool #

length :: Complex a -> Int #

elem :: Eq a => a -> Complex a -> Bool #

maximum :: Ord a => Complex a -> a #

minimum :: Ord a => Complex a -> a #

sum :: Num a => Complex a -> a #

product :: Num a => Complex a -> a #

Foldable Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

fold :: Monoid m => Identity m -> m #

foldMap :: Monoid m => (a -> m) -> Identity a -> m #

foldMap' :: Monoid m => (a -> m) -> Identity a -> m #

foldr :: (a -> b -> b) -> b -> Identity a -> b #

foldr' :: (a -> b -> b) -> b -> Identity a -> b #

foldl :: (b -> a -> b) -> b -> Identity a -> b #

foldl' :: (b -> a -> b) -> b -> Identity a -> b #

foldr1 :: (a -> a -> a) -> Identity a -> a #

foldl1 :: (a -> a -> a) -> Identity a -> a #

toList :: Identity a -> [a] #

null :: Identity a -> Bool #

length :: Identity a -> Int #

elem :: Eq a => a -> Identity a -> Bool #

maximum :: Ord a => Identity a -> a #

minimum :: Ord a => Identity a -> a #

sum :: Num a => Identity a -> a #

product :: Num a => Identity a -> a #

Foldable First

Since: base-4.8.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => First m -> m #

foldMap :: Monoid m => (a -> m) -> First a -> m #

foldMap' :: Monoid m => (a -> m) -> First a -> m #

foldr :: (a -> b -> b) -> b -> First a -> b #

foldr' :: (a -> b -> b) -> b -> First a -> b #

foldl :: (b -> a -> b) -> b -> First a -> b #

foldl' :: (b -> a -> b) -> b -> First a -> b #

foldr1 :: (a -> a -> a) -> First a -> a #

foldl1 :: (a -> a -> a) -> First a -> a #

toList :: First a -> [a] #

null :: First a -> Bool #

length :: First a -> Int #

elem :: Eq a => a -> First a -> Bool #

maximum :: Ord a => First a -> a #

minimum :: Ord a => First a -> a #

sum :: Num a => First a -> a #

product :: Num a => First a -> a #

Foldable Last

Since: base-4.8.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Last m -> m #

foldMap :: Monoid m => (a -> m) -> Last a -> m #

foldMap' :: Monoid m => (a -> m) -> Last a -> m #

foldr :: (a -> b -> b) -> b -> Last a -> b #

foldr' :: (a -> b -> b) -> b -> Last a -> b #

foldl :: (b -> a -> b) -> b -> Last a -> b #

foldl' :: (b -> a -> b) -> b -> Last a -> b #

foldr1 :: (a -> a -> a) -> Last a -> a #

foldl1 :: (a -> a -> a) -> Last a -> a #

toList :: Last a -> [a] #

null :: Last a -> Bool #

length :: Last a -> Int #

elem :: Eq a => a -> Last a -> Bool #

maximum :: Ord a => Last a -> a #

minimum :: Ord a => Last a -> a #

sum :: Num a => Last a -> a #

product :: Num a => Last a -> a #

Foldable Down

Since: base-4.12.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Down m -> m #

foldMap :: Monoid m => (a -> m) -> Down a -> m #

foldMap' :: Monoid m => (a -> m) -> Down a -> m #

foldr :: (a -> b -> b) -> b -> Down a -> b #

foldr' :: (a -> b -> b) -> b -> Down a -> b #

foldl :: (b -> a -> b) -> b -> Down a -> b #

foldl' :: (b -> a -> b) -> b -> Down a -> b #

foldr1 :: (a -> a -> a) -> Down a -> a #

foldl1 :: (a -> a -> a) -> Down a -> a #

toList :: Down a -> [a] #

null :: Down a -> Bool #

length :: Down a -> Int #

elem :: Eq a => a -> Down a -> Bool #

maximum :: Ord a => Down a -> a #

minimum :: Ord a => Down a -> a #

sum :: Num a => Down a -> a #

product :: Num a => Down a -> a #

Foldable First

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

fold :: Monoid m => First m -> m #

foldMap :: Monoid m => (a -> m) -> First a -> m #

foldMap' :: Monoid m => (a -> m) -> First a -> m #

foldr :: (a -> b -> b) -> b -> First a -> b #

foldr' :: (a -> b -> b) -> b -> First a -> b #

foldl :: (b -> a -> b) -> b -> First a -> b #

foldl' :: (b -> a -> b) -> b -> First a -> b #

foldr1 :: (a -> a -> a) -> First a -> a #

foldl1 :: (a -> a -> a) -> First a -> a #

toList :: First a -> [a] #

null :: First a -> Bool #

length :: First a -> Int #

elem :: Eq a => a -> First a -> Bool #

maximum :: Ord a => First a -> a #

minimum :: Ord a => First a -> a #

sum :: Num a => First a -> a #

product :: Num a => First a -> a #

Foldable Last

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

fold :: Monoid m => Last m -> m #

foldMap :: Monoid m => (a -> m) -> Last a -> m #

foldMap' :: Monoid m => (a -> m) -> Last a -> m #

foldr :: (a -> b -> b) -> b -> Last a -> b #

foldr' :: (a -> b -> b) -> b -> Last a -> b #

foldl :: (b -> a -> b) -> b -> Last a -> b #

foldl' :: (b -> a -> b) -> b -> Last a -> b #

foldr1 :: (a -> a -> a) -> Last a -> a #

foldl1 :: (a -> a -> a) -> Last a -> a #

toList :: Last a -> [a] #

null :: Last a -> Bool #

length :: Last a -> Int #

elem :: Eq a => a -> Last a -> Bool #

maximum :: Ord a => Last a -> a #

minimum :: Ord a => Last a -> a #

sum :: Num a => Last a -> a #

product :: Num a => Last a -> a #

Foldable Max

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

fold :: Monoid m => Max m -> m #

foldMap :: Monoid m => (a -> m) -> Max a -> m #

foldMap' :: Monoid m => (a -> m) -> Max a -> m #

foldr :: (a -> b -> b) -> b -> Max a -> b #

foldr' :: (a -> b -> b) -> b -> Max a -> b #

foldl :: (b -> a -> b) -> b -> Max a -> b #

foldl' :: (b -> a -> b) -> b -> Max a -> b #

foldr1 :: (a -> a -> a) -> Max a -> a #

foldl1 :: (a -> a -> a) -> Max a -> a #

toList :: Max a -> [a] #

null :: Max a -> Bool #

length :: Max a -> Int #

elem :: Eq a => a -> Max a -> Bool #

maximum :: Ord a => Max a -> a #

minimum :: Ord a => Max a -> a #

sum :: Num a => Max a -> a #

product :: Num a => Max a -> a #

Foldable Min

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

fold :: Monoid m => Min m -> m #

foldMap :: Monoid m => (a -> m) -> Min a -> m #

foldMap' :: Monoid m => (a -> m) -> Min a -> m #

foldr :: (a -> b -> b) -> b -> Min a -> b #

foldr' :: (a -> b -> b) -> b -> Min a -> b #

foldl :: (b -> a -> b) -> b -> Min a -> b #

foldl' :: (b -> a -> b) -> b -> Min a -> b #

foldr1 :: (a -> a -> a) -> Min a -> a #

foldl1 :: (a -> a -> a) -> Min a -> a #

toList :: Min a -> [a] #

null :: Min a -> Bool #

length :: Min a -> Int #

elem :: Eq a => a -> Min a -> Bool #

maximum :: Ord a => Min a -> a #

minimum :: Ord a => Min a -> a #

sum :: Num a => Min a -> a #

product :: Num a => Min a -> a #

Foldable Dual

Since: base-4.8.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Dual m -> m #

foldMap :: Monoid m => (a -> m) -> Dual a -> m #

foldMap' :: Monoid m => (a -> m) -> Dual a -> m #

foldr :: (a -> b -> b) -> b -> Dual a -> b #

foldr' :: (a -> b -> b) -> b -> Dual a -> b #

foldl :: (b -> a -> b) -> b -> Dual a -> b #

foldl' :: (b -> a -> b) -> b -> Dual a -> b #

foldr1 :: (a -> a -> a) -> Dual a -> a #

foldl1 :: (a -> a -> a) -> Dual a -> a #

toList :: Dual a -> [a] #

null :: Dual a -> Bool #

length :: Dual a -> Int #

elem :: Eq a => a -> Dual a -> Bool #

maximum :: Ord a => Dual a -> a #

minimum :: Ord a => Dual a -> a #

sum :: Num a => Dual a -> a #

product :: Num a => Dual a -> a #

Foldable Product

Since: base-4.8.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Product m -> m #

foldMap :: Monoid m => (a -> m) -> Product a -> m #

foldMap' :: Monoid m => (a -> m) -> Product a -> m #

foldr :: (a -> b -> b) -> b -> Product a -> b #

foldr' :: (a -> b -> b) -> b -> Product a -> b #

foldl :: (b -> a -> b) -> b -> Product a -> b #

foldl' :: (b -> a -> b) -> b -> Product a -> b #

foldr1 :: (a -> a -> a) -> Product a -> a #

foldl1 :: (a -> a -> a) -> Product a -> a #

toList :: Product a -> [a] #

null :: Product a -> Bool #

length :: Product a -> Int #

elem :: Eq a => a -> Product a -> Bool #

maximum :: Ord a => Product a -> a #

minimum :: Ord a => Product a -> a #

sum :: Num a => Product a -> a #

product :: Num a => Product a -> a #

Foldable Sum

Since: base-4.8.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Sum m -> m #

foldMap :: Monoid m => (a -> m) -> Sum a -> m #

foldMap' :: Monoid m => (a -> m) -> Sum a -> m #

foldr :: (a -> b -> b) -> b -> Sum a -> b #

foldr' :: (a -> b -> b) -> b -> Sum a -> b #

foldl :: (b -> a -> b) -> b -> Sum a -> b #

foldl' :: (b -> a -> b) -> b -> Sum a -> b #

foldr1 :: (a -> a -> a) -> Sum a -> a #

foldl1 :: (a -> a -> a) -> Sum a -> a #

toList :: Sum a -> [a] #

null :: Sum a -> Bool #

length :: Sum a -> Int #

elem :: Eq a => a -> Sum a -> Bool #

maximum :: Ord a => Sum a -> a #

minimum :: Ord a => Sum a -> a #

sum :: Num a => Sum a -> a #

product :: Num a => Sum a -> a #

Foldable Par1

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Par1 m -> m #

foldMap :: Monoid m => (a -> m) -> Par1 a -> m #

foldMap' :: Monoid m => (a -> m) -> Par1 a -> m #

foldr :: (a -> b -> b) -> b -> Par1 a -> b #

foldr' :: (a -> b -> b) -> b -> Par1 a -> b #

foldl :: (b -> a -> b) -> b -> Par1 a -> b #

foldl' :: (b -> a -> b) -> b -> Par1 a -> b #

foldr1 :: (a -> a -> a) -> Par1 a -> a #

foldl1 :: (a -> a -> a) -> Par1 a -> a #

toList :: Par1 a -> [a] #

null :: Par1 a -> Bool #

length :: Par1 a -> Int #

elem :: Eq a => a -> Par1 a -> Bool #

maximum :: Ord a => Par1 a -> a #

minimum :: Ord a => Par1 a -> a #

sum :: Num a => Par1 a -> a #

product :: Num a => Par1 a -> a #

Foldable SCC

Since: containers-0.5.9

Instance details

Defined in Data.Graph

Methods

fold :: Monoid m => SCC m -> m #

foldMap :: Monoid m => (a -> m) -> SCC a -> m #

foldMap' :: Monoid m => (a -> m) -> SCC a -> m #

foldr :: (a -> b -> b) -> b -> SCC a -> b #

foldr' :: (a -> b -> b) -> b -> SCC a -> b #

foldl :: (b -> a -> b) -> b -> SCC a -> b #

foldl' :: (b -> a -> b) -> b -> SCC a -> b #

foldr1 :: (a -> a -> a) -> SCC a -> a #

foldl1 :: (a -> a -> a) -> SCC a -> a #

toList :: SCC a -> [a] #

null :: SCC a -> Bool #

length :: SCC a -> Int #

elem :: Eq a => a -> SCC a -> Bool #

maximum :: Ord a => SCC a -> a #

minimum :: Ord a => SCC a -> a #

sum :: Num a => SCC a -> a #

product :: Num a => SCC a -> a #

Foldable IntMap

Folds in order of increasing key.

Instance details

Defined in Data.IntMap.Internal

Methods

fold :: Monoid m => IntMap m -> m #

foldMap :: Monoid m => (a -> m) -> IntMap a -> m #

foldMap' :: Monoid m => (a -> m) -> IntMap a -> m #

foldr :: (a -> b -> b) -> b -> IntMap a -> b #

foldr' :: (a -> b -> b) -> b -> IntMap a -> b #

foldl :: (b -> a -> b) -> b -> IntMap a -> b #

foldl' :: (b -> a -> b) -> b -> IntMap a -> b #

foldr1 :: (a -> a -> a) -> IntMap a -> a #

foldl1 :: (a -> a -> a) -> IntMap a -> a #

toList :: IntMap a -> [a] #

null :: IntMap a -> Bool #

length :: IntMap a -> Int #

elem :: Eq a => a -> IntMap a -> Bool #

maximum :: Ord a => IntMap a -> a #

minimum :: Ord a => IntMap a -> a #

sum :: Num a => IntMap a -> a #

product :: Num a => IntMap a -> a #

Foldable Digit 
Instance details

Defined in Data.Sequence.Internal

Methods

fold :: Monoid m => Digit m -> m #

foldMap :: Monoid m => (a -> m) -> Digit a -> m #

foldMap' :: Monoid m => (a -> m) -> Digit a -> m #

foldr :: (a -> b -> b) -> b -> Digit a -> b #

foldr' :: (a -> b -> b) -> b -> Digit a -> b #

foldl :: (b -> a -> b) -> b -> Digit a -> b #

foldl' :: (b -> a -> b) -> b -> Digit a -> b #

foldr1 :: (a -> a -> a) -> Digit a -> a #

foldl1 :: (a -> a -> a) -> Digit a -> a #

toList :: Digit a -> [a] #

null :: Digit a -> Bool #

length :: Digit a -> Int #

elem :: Eq a => a -> Digit a -> Bool #

maximum :: Ord a => Digit a -> a #

minimum :: Ord a => Digit a -> a #

sum :: Num a => Digit a -> a #

product :: Num a => Digit a -> a #

Foldable Elem 
Instance details

Defined in Data.Sequence.Internal

Methods

fold :: Monoid m => Elem m -> m #

foldMap :: Monoid m => (a -> m) -> Elem a -> m #

foldMap' :: Monoid m => (a -> m) -> Elem a -> m #

foldr :: (a -> b -> b) -> b -> Elem a -> b #

foldr' :: (a -> b -> b) -> b -> Elem a -> b #

foldl :: (b -> a -> b) -> b -> Elem a -> b #

foldl' :: (b -> a -> b) -> b -> Elem a -> b #

foldr1 :: (a -> a -> a) -> Elem a -> a #

foldl1 :: (a -> a -> a) -> Elem a -> a #

toList :: Elem a -> [a] #

null :: Elem a -> Bool #

length :: Elem a -> Int #

elem :: Eq a => a -> Elem a -> Bool #

maximum :: Ord a => Elem a -> a #

minimum :: Ord a => Elem a -> a #

sum :: Num a => Elem a -> a #

product :: Num a => Elem a -> a #

Foldable FingerTree 
Instance details

Defined in Data.Sequence.Internal

Methods

fold :: Monoid m => FingerTree m -> m #

foldMap :: Monoid m => (a -> m) -> FingerTree a -> m #

foldMap' :: Monoid m => (a -> m) -> FingerTree a -> m #

foldr :: (a -> b -> b) -> b -> FingerTree a -> b #

foldr' :: (a -> b -> b) -> b -> FingerTree a -> b #

foldl :: (b -> a -> b) -> b -> FingerTree a -> b #

foldl' :: (b -> a -> b) -> b -> FingerTree a -> b #

foldr1 :: (a -> a -> a) -> FingerTree a -> a #

foldl1 :: (a -> a -> a) -> FingerTree a -> a #

toList :: FingerTree a -> [a] #

null :: FingerTree a -> Bool #

length :: FingerTree a -> Int #

elem :: Eq a => a -> FingerTree a -> Bool #

maximum :: Ord a => FingerTree a -> a #

minimum :: Ord a => FingerTree a -> a #

sum :: Num a => FingerTree a -> a #

product :: Num a => FingerTree a -> a #

Foldable Node 
Instance details

Defined in Data.Sequence.Internal

Methods

fold :: Monoid m => Node m -> m #

foldMap :: Monoid m => (a -> m) -> Node a -> m #

foldMap' :: Monoid m => (a -> m) -> Node a -> m #

foldr :: (a -> b -> b) -> b -> Node a -> b #

foldr' :: (a -> b -> b) -> b -> Node a -> b #

foldl :: (b -> a -> b) -> b -> Node a -> b #

foldl' :: (b -> a -> b) -> b -> Node a -> b #

foldr1 :: (a -> a -> a) -> Node a -> a #

foldl1 :: (a -> a -> a) -> Node a -> a #

toList :: Node a -> [a] #

null :: Node a -> Bool #

length :: Node a -> Int #

elem :: Eq a => a -> Node a -> Bool #

maximum :: Ord a => Node a -> a #

minimum :: Ord a => Node a -> a #

sum :: Num a => Node a -> a #

product :: Num a => Node a -> a #

Foldable Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

fold :: Monoid m => Seq m -> m #

foldMap :: Monoid m => (a -> m) -> Seq a -> m #

foldMap' :: Monoid m => (a -> m) -> Seq a -> m #

foldr :: (a -> b -> b) -> b -> Seq a -> b #

foldr' :: (a -> b -> b) -> b -> Seq a -> b #

foldl :: (b -> a -> b) -> b -> Seq a -> b #

foldl' :: (b -> a -> b) -> b -> Seq a -> b #

foldr1 :: (a -> a -> a) -> Seq a -> a #

foldl1 :: (a -> a -> a) -> Seq a -> a #

toList :: Seq a -> [a] #

null :: Seq a -> Bool #

length :: Seq a -> Int #

elem :: Eq a => a -> Seq a -> Bool #

maximum :: Ord a => Seq a -> a #

minimum :: Ord a => Seq a -> a #

sum :: Num a => Seq a -> a #

product :: Num a => Seq a -> a #

Foldable ViewL 
Instance details

Defined in Data.Sequence.Internal

Methods

fold :: Monoid m => ViewL m -> m #

foldMap :: Monoid m => (a -> m) -> ViewL a -> m #

foldMap' :: Monoid m => (a -> m) -> ViewL a -> m #

foldr :: (a -> b -> b) -> b -> ViewL a -> b #

foldr' :: (a -> b -> b) -> b -> ViewL a -> b #

foldl :: (b -> a -> b) -> b -> ViewL a -> b #

foldl' :: (b -> a -> b) -> b -> ViewL a -> b #

foldr1 :: (a -> a -> a) -> ViewL a -> a #

foldl1 :: (a -> a -> a) -> ViewL a -> a #

toList :: ViewL a -> [a] #

null :: ViewL a -> Bool #

length :: ViewL a -> Int #

elem :: Eq a => a -> ViewL a -> Bool #

maximum :: Ord a => ViewL a -> a #

minimum :: Ord a => ViewL a -> a #

sum :: Num a => ViewL a -> a #

product :: Num a => ViewL a -> a #

Foldable ViewR 
Instance details

Defined in Data.Sequence.Internal

Methods

fold :: Monoid m => ViewR m -> m #

foldMap :: Monoid m => (a -> m) -> ViewR a -> m #

foldMap' :: Monoid m => (a -> m) -> ViewR a -> m #

foldr :: (a -> b -> b) -> b -> ViewR a -> b #

foldr' :: (a -> b -> b) -> b -> ViewR a -> b #

foldl :: (b -> a -> b) -> b -> ViewR a -> b #

foldl' :: (b -> a -> b) -> b -> ViewR a -> b #

foldr1 :: (a -> a -> a) -> ViewR a -> a #

foldl1 :: (a -> a -> a) -> ViewR a -> a #

toList :: ViewR a -> [a] #

null :: ViewR a -> Bool #

length :: ViewR a -> Int #

elem :: Eq a => a -> ViewR a -> Bool #

maximum :: Ord a => ViewR a -> a #

minimum :: Ord a => ViewR a -> a #

sum :: Num a => ViewR a -> a #

product :: Num a => ViewR a -> a #

Foldable Set

Folds in order of increasing key.

Instance details

Defined in Data.Set.Internal

Methods

fold :: Monoid m => Set m -> m #

foldMap :: Monoid m => (a -> m) -> Set a -> m #

foldMap' :: Monoid m => (a -> m) -> Set a -> m #

foldr :: (a -> b -> b) -> b -> Set a -> b #

foldr' :: (a -> b -> b) -> b -> Set a -> b #

foldl :: (b -> a -> b) -> b -> Set a -> b #

foldl' :: (b -> a -> b) -> b -> Set a -> b #

foldr1 :: (a -> a -> a) -> Set a -> a #

foldl1 :: (a -> a -> a) -> Set a -> a #

toList :: Set a -> [a] #

null :: Set a -> Bool #

length :: Set a -> Int #

elem :: Eq a => a -> Set a -> Bool #

maximum :: Ord a => Set a -> a #

minimum :: Ord a => Set a -> a #

sum :: Num a => Set a -> a #

product :: Num a => Set a -> a #

Foldable Tree 
Instance details

Defined in Data.Tree

Methods

fold :: Monoid m => Tree m -> m #

foldMap :: Monoid m => (a -> m) -> Tree a -> m #

foldMap' :: Monoid m => (a -> m) -> Tree a -> m #

foldr :: (a -> b -> b) -> b -> Tree a -> b #

foldr' :: (a -> b -> b) -> b -> Tree a -> b #

foldl :: (b -> a -> b) -> b -> Tree a -> b #

foldl' :: (b -> a -> b) -> b -> Tree a -> b #

foldr1 :: (a -> a -> a) -> Tree a -> a #

foldl1 :: (a -> a -> a) -> Tree a -> a #

toList :: Tree a -> [a] #

null :: Tree a -> Bool #

length :: Tree a -> Int #

elem :: Eq a => a -> Tree a -> Bool #

maximum :: Ord a => Tree a -> a #

minimum :: Ord a => Tree a -> a #

sum :: Num a => Tree a -> a #

product :: Num a => Tree a -> a #

Foldable DNonEmpty 
Instance details

Defined in Data.DList.DNonEmpty.Internal

Methods

fold :: Monoid m => DNonEmpty m -> m #

foldMap :: Monoid m => (a -> m) -> DNonEmpty a -> m #

foldMap' :: Monoid m => (a -> m) -> DNonEmpty a -> m #

foldr :: (a -> b -> b) -> b -> DNonEmpty a -> b #

foldr' :: (a -> b -> b) -> b -> DNonEmpty a -> b #

foldl :: (b -> a -> b) -> b -> DNonEmpty a -> b #

foldl' :: (b -> a -> b) -> b -> DNonEmpty a -> b #

foldr1 :: (a -> a -> a) -> DNonEmpty a -> a #

foldl1 :: (a -> a -> a) -> DNonEmpty a -> a #

toList :: DNonEmpty a -> [a] #

null :: DNonEmpty a -> Bool #

length :: DNonEmpty a -> Int #

elem :: Eq a => a -> DNonEmpty a -> Bool #

maximum :: Ord a => DNonEmpty a -> a #

minimum :: Ord a => DNonEmpty a -> a #

sum :: Num a => DNonEmpty a -> a #

product :: Num a => DNonEmpty a -> a #

Foldable DList 
Instance details

Defined in Data.DList.Internal

Methods

fold :: Monoid m => DList m -> m #

foldMap :: Monoid m => (a -> m) -> DList a -> m #

foldMap' :: Monoid m => (a -> m) -> DList a -> m #

foldr :: (a -> b -> b) -> b -> DList a -> b #

foldr' :: (a -> b -> b) -> b -> DList a -> b #

foldl :: (b -> a -> b) -> b -> DList a -> b #

foldl' :: (b -> a -> b) -> b -> DList a -> b #

foldr1 :: (a -> a -> a) -> DList a -> a #

foldl1 :: (a -> a -> a) -> DList a -> a #

toList :: DList a -> [a] #

null :: DList a -> Bool #

length :: DList a -> Int #

elem :: Eq a => a -> DList a -> Bool #

maximum :: Ord a => DList a -> a #

minimum :: Ord a => DList a -> a #

sum :: Num a => DList a -> a #

product :: Num a => DList a -> a #

Foldable Hashed 
Instance details

Defined in Data.Hashable.Class

Methods

fold :: Monoid m => Hashed m -> m #

foldMap :: Monoid m => (a -> m) -> Hashed a -> m #

foldMap' :: Monoid m => (a -> m) -> Hashed a -> m #

foldr :: (a -> b -> b) -> b -> Hashed a -> b #

foldr' :: (a -> b -> b) -> b -> Hashed a -> b #

foldl :: (b -> a -> b) -> b -> Hashed a -> b #

foldl' :: (b -> a -> b) -> b -> Hashed a -> b #

foldr1 :: (a -> a -> a) -> Hashed a -> a #

foldl1 :: (a -> a -> a) -> Hashed a -> a #

toList :: Hashed a -> [a] #

null :: Hashed a -> Bool #

length :: Hashed a -> Int #

elem :: Eq a => a -> Hashed a -> Bool #

maximum :: Ord a => Hashed a -> a #

minimum :: Ord a => Hashed a -> a #

sum :: Num a => Hashed a -> a #

product :: Num a => Hashed a -> a #

Foldable HistoriedResponse 
Instance details

Defined in Network.HTTP.Client

Methods

fold :: Monoid m => HistoriedResponse m -> m #

foldMap :: Monoid m => (a -> m) -> HistoriedResponse a -> m #

foldMap' :: Monoid m => (a -> m) -> HistoriedResponse a -> m #

foldr :: (a -> b -> b) -> b -> HistoriedResponse a -> b #

foldr' :: (a -> b -> b) -> b -> HistoriedResponse a -> b #

foldl :: (b -> a -> b) -> b -> HistoriedResponse a -> b #

foldl' :: (b -> a -> b) -> b -> HistoriedResponse a -> b #

foldr1 :: (a -> a -> a) -> HistoriedResponse a -> a #

foldl1 :: (a -> a -> a) -> HistoriedResponse a -> a #

toList :: HistoriedResponse a -> [a] #

null :: HistoriedResponse a -> Bool #

length :: HistoriedResponse a -> Int #

elem :: Eq a => a -> HistoriedResponse a -> Bool #

maximum :: Ord a => HistoriedResponse a -> a #

minimum :: Ord a => HistoriedResponse a -> a #

sum :: Num a => HistoriedResponse a -> a #

product :: Num a => HistoriedResponse a -> a #

Foldable Response 
Instance details

Defined in Network.HTTP.Client.Types

Methods

fold :: Monoid m => Response m -> m #

foldMap :: Monoid m => (a -> m) -> Response a -> m #

foldMap' :: Monoid m => (a -> m) -> Response a -> m #

foldr :: (a -> b -> b) -> b -> Response a -> b #

foldr' :: (a -> b -> b) -> b -> Response a -> b #

foldl :: (b -> a -> b) -> b -> Response a -> b #

foldl' :: (b -> a -> b) -> b -> Response a -> b #

foldr1 :: (a -> a -> a) -> Response a -> a #

foldl1 :: (a -> a -> a) -> Response a -> a #

toList :: Response a -> [a] #

null :: Response a -> Bool #

length :: Response a -> Int #

elem :: Eq a => a -> Response a -> Bool #

maximum :: Ord a => Response a -> a #

minimum :: Ord a => Response a -> a #

sum :: Num a => Response a -> a #

product :: Num a => Response a -> a #

Foldable SimpleDocStream

Collect all annotations from a document.

Instance details

Defined in Prettyprinter.Internal

Methods

fold :: Monoid m => SimpleDocStream m -> m #

foldMap :: Monoid m => (a -> m) -> SimpleDocStream a -> m #

foldMap' :: Monoid m => (a -> m) -> SimpleDocStream a -> m #

foldr :: (a -> b -> b) -> b -> SimpleDocStream a -> b #

foldr' :: (a -> b -> b) -> b -> SimpleDocStream a -> b #

foldl :: (b -> a -> b) -> b -> SimpleDocStream a -> b #

foldl' :: (b -> a -> b) -> b -> SimpleDocStream a -> b #

foldr1 :: (a -> a -> a) -> SimpleDocStream a -> a #

foldl1 :: (a -> a -> a) -> SimpleDocStream a -> a #

toList :: SimpleDocStream a -> [a] #

null :: SimpleDocStream a -> Bool #

length :: SimpleDocStream a -> Int #

elem :: Eq a => a -> SimpleDocStream a -> Bool #

maximum :: Ord a => SimpleDocStream a -> a #

minimum :: Ord a => SimpleDocStream a -> a #

sum :: Num a => SimpleDocStream a -> a #

product :: Num a => SimpleDocStream a -> a #

Foldable Array 
Instance details

Defined in Data.Primitive.Array

Methods

fold :: Monoid m => Array m -> m #

foldMap :: Monoid m => (a -> m) -> Array a -> m #

foldMap' :: Monoid m => (a -> m) -> Array a -> m #

foldr :: (a -> b -> b) -> b -> Array a -> b #

foldr' :: (a -> b -> b) -> b -> Array a -> b #

foldl :: (b -> a -> b) -> b -> Array a -> b #

foldl' :: (b -> a -> b) -> b -> Array a -> b #

foldr1 :: (a -> a -> a) -> Array a -> a #

foldl1 :: (a -> a -> a) -> Array a -> a #

toList :: Array a -> [a] #

null :: Array a -> Bool #

length :: Array a -> Int #

elem :: Eq a => a -> Array a -> Bool #

maximum :: Ord a => Array a -> a #

minimum :: Ord a => Array a -> a #

sum :: Num a => Array a -> a #

product :: Num a => Array a -> a #

Foldable SmallArray 
Instance details

Defined in Data.Primitive.SmallArray

Methods

fold :: Monoid m => SmallArray m -> m #

foldMap :: Monoid m => (a -> m) -> SmallArray a -> m #

foldMap' :: Monoid m => (a -> m) -> SmallArray a -> m #

foldr :: (a -> b -> b) -> b -> SmallArray a -> b #

foldr' :: (a -> b -> b) -> b -> SmallArray a -> b #

foldl :: (b -> a -> b) -> b -> SmallArray a -> b #

foldl' :: (b -> a -> b) -> b -> SmallArray a -> b #

foldr1 :: (a -> a -> a) -> SmallArray a -> a #

foldl1 :: (a -> a -> a) -> SmallArray a -> a #

toList :: SmallArray a -> [a] #

null :: SmallArray a -> Bool #

length :: SmallArray a -> Int #

elem :: Eq a => a -> SmallArray a -> Bool #

maximum :: Ord a => SmallArray a -> a #

minimum :: Ord a => SmallArray a -> a #

sum :: Num a => SmallArray a -> a #

product :: Num a => SmallArray a -> a #

Foldable OneOrListOf Source # 
Instance details

Defined in Stackctl.OneOrListOf

Methods

fold :: Monoid m => OneOrListOf m -> m #

foldMap :: Monoid m => (a -> m) -> OneOrListOf a -> m #

foldMap' :: Monoid m => (a -> m) -> OneOrListOf a -> m #

foldr :: (a -> b -> b) -> b -> OneOrListOf a -> b #

foldr' :: (a -> b -> b) -> b -> OneOrListOf a -> b #

foldl :: (b -> a -> b) -> b -> OneOrListOf a -> b #

foldl' :: (b -> a -> b) -> b -> OneOrListOf a -> b #

foldr1 :: (a -> a -> a) -> OneOrListOf a -> a #

foldl1 :: (a -> a -> a) -> OneOrListOf a -> a #

toList :: OneOrListOf a -> [a] #

null :: OneOrListOf a -> Bool #

length :: OneOrListOf a -> Int #

elem :: Eq a => a -> OneOrListOf a -> Bool #

maximum :: Ord a => OneOrListOf a -> a #

minimum :: Ord a => OneOrListOf a -> a #

sum :: Num a => OneOrListOf a -> a #

product :: Num a => OneOrListOf a -> a #

Foldable Maybe 
Instance details

Defined in Data.Strict.Maybe

Methods

fold :: Monoid m => Maybe m -> m #

foldMap :: Monoid m => (a -> m) -> Maybe a -> m #

foldMap' :: Monoid m => (a -> m) -> Maybe a -> m #

foldr :: (a -> b -> b) -> b -> Maybe a -> b #

foldr' :: (a -> b -> b) -> b -> Maybe a -> b #

foldl :: (b -> a -> b) -> b -> Maybe a -> b #

foldl' :: (b -> a -> b) -> b -> Maybe a -> b #

foldr1 :: (a -> a -> a) -> Maybe a -> a #

foldl1 :: (a -> a -> a) -> Maybe a -> a #

toList :: Maybe a -> [a] #

null :: Maybe a -> Bool #

length :: Maybe a -> Int #

elem :: Eq a => a -> Maybe a -> Bool #

maximum :: Ord a => Maybe a -> a #

minimum :: Ord a => Maybe a -> a #

sum :: Num a => Maybe a -> a #

product :: Num a => Maybe a -> a #

Foldable HashSet 
Instance details

Defined in Data.HashSet.Internal

Methods

fold :: Monoid m => HashSet m -> m #

foldMap :: Monoid m => (a -> m) -> HashSet a -> m #

foldMap' :: Monoid m => (a -> m) -> HashSet a -> m #

foldr :: (a -> b -> b) -> b -> HashSet a -> b #

foldr' :: (a -> b -> b) -> b -> HashSet a -> b #

foldl :: (b -> a -> b) -> b -> HashSet a -> b #

foldl' :: (b -> a -> b) -> b -> HashSet a -> b #

foldr1 :: (a -> a -> a) -> HashSet a -> a #

foldl1 :: (a -> a -> a) -> HashSet a -> a #

toList :: HashSet a -> [a] #

null :: HashSet a -> Bool #

length :: HashSet a -> Int #

elem :: Eq a => a -> HashSet a -> Bool #

maximum :: Ord a => HashSet a -> a #

minimum :: Ord a => HashSet a -> a #

sum :: Num a => HashSet a -> a #

product :: Num a => HashSet a -> a #

Foldable Vector 
Instance details

Defined in Data.Vector

Methods

fold :: Monoid m => Vector m -> m #

foldMap :: Monoid m => (a -> m) -> Vector a -> m #

foldMap' :: Monoid m => (a -> m) -> Vector a -> m #

foldr :: (a -> b -> b) -> b -> Vector a -> b #

foldr' :: (a -> b -> b) -> b -> Vector a -> b #

foldl :: (b -> a -> b) -> b -> Vector a -> b #

foldl' :: (b -> a -> b) -> b -> Vector a -> b #

foldr1 :: (a -> a -> a) -> Vector a -> a #

foldl1 :: (a -> a -> a) -> Vector a -> a #

toList :: Vector a -> [a] #

null :: Vector a -> Bool #

length :: Vector a -> Int #

elem :: Eq a => a -> Vector a -> Bool #

maximum :: Ord a => Vector a -> a #

minimum :: Ord a => Vector a -> a #

sum :: Num a => Vector a -> a #

product :: Num a => Vector a -> a #

Foldable NonEmpty

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => NonEmpty m -> m #

foldMap :: Monoid m => (a -> m) -> NonEmpty a -> m #

foldMap' :: Monoid m => (a -> m) -> NonEmpty a -> m #

foldr :: (a -> b -> b) -> b -> NonEmpty a -> b #

foldr' :: (a -> b -> b) -> b -> NonEmpty a -> b #

foldl :: (b -> a -> b) -> b -> NonEmpty a -> b #

foldl' :: (b -> a -> b) -> b -> NonEmpty a -> b #

foldr1 :: (a -> a -> a) -> NonEmpty a -> a #

foldl1 :: (a -> a -> a) -> NonEmpty a -> a #

toList :: NonEmpty a -> [a] #

null :: NonEmpty a -> Bool #

length :: NonEmpty a -> Int #

elem :: Eq a => a -> NonEmpty a -> Bool #

maximum :: Ord a => NonEmpty a -> a #

minimum :: Ord a => NonEmpty a -> a #

sum :: Num a => NonEmpty a -> a #

product :: Num a => NonEmpty a -> a #

Foldable Maybe

Since: base-2.1

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Maybe m -> m #

foldMap :: Monoid m => (a -> m) -> Maybe a -> m #

foldMap' :: Monoid m => (a -> m) -> Maybe a -> m #

foldr :: (a -> b -> b) -> b -> Maybe a -> b #

foldr' :: (a -> b -> b) -> b -> Maybe a -> b #

foldl :: (b -> a -> b) -> b -> Maybe a -> b #

foldl' :: (b -> a -> b) -> b -> Maybe a -> b #

foldr1 :: (a -> a -> a) -> Maybe a -> a #

foldl1 :: (a -> a -> a) -> Maybe a -> a #

toList :: Maybe a -> [a] #

null :: Maybe a -> Bool #

length :: Maybe a -> Int #

elem :: Eq a => a -> Maybe a -> Bool #

maximum :: Ord a => Maybe a -> a #

minimum :: Ord a => Maybe a -> a #

sum :: Num a => Maybe a -> a #

product :: Num a => Maybe a -> a #

Foldable Solo

Since: base-4.15

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Solo m -> m #

foldMap :: Monoid m => (a -> m) -> Solo a -> m #

foldMap' :: Monoid m => (a -> m) -> Solo a -> m #

foldr :: (a -> b -> b) -> b -> Solo a -> b #

foldr' :: (a -> b -> b) -> b -> Solo a -> b #

foldl :: (b -> a -> b) -> b -> Solo a -> b #

foldl' :: (b -> a -> b) -> b -> Solo a -> b #

foldr1 :: (a -> a -> a) -> Solo a -> a #

foldl1 :: (a -> a -> a) -> Solo a -> a #

toList :: Solo a -> [a] #

null :: Solo a -> Bool #

length :: Solo a -> Int #

elem :: Eq a => a -> Solo a -> Bool #

maximum :: Ord a => Solo a -> a #

minimum :: Ord a => Solo a -> a #

sum :: Num a => Solo a -> a #

product :: Num a => Solo a -> a #

Foldable []

Since: base-2.1

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => [m] -> m #

foldMap :: Monoid m => (a -> m) -> [a] -> m #

foldMap' :: Monoid m => (a -> m) -> [a] -> m #

foldr :: (a -> b -> b) -> b -> [a] -> b #

foldr' :: (a -> b -> b) -> b -> [a] -> b #

foldl :: (b -> a -> b) -> b -> [a] -> b #

foldl' :: (b -> a -> b) -> b -> [a] -> b #

foldr1 :: (a -> a -> a) -> [a] -> a #

foldl1 :: (a -> a -> a) -> [a] -> a #

toList :: [a] -> [a] #

null :: [a] -> Bool #

length :: [a] -> Int #

elem :: Eq a => a -> [a] -> Bool #

maximum :: Ord a => [a] -> a #

minimum :: Ord a => [a] -> a #

sum :: Num a => [a] -> a #

product :: Num a => [a] -> a #

Foldable (Either a)

Since: base-4.7.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Either a m -> m #

foldMap :: Monoid m => (a0 -> m) -> Either a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> Either a a0 -> m #

foldr :: (a0 -> b -> b) -> b -> Either a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Either a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> Either a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> Either a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Either a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> Either a a0 -> a0 #

toList :: Either a a0 -> [a0] #

null :: Either a a0 -> Bool #

length :: Either a a0 -> Int #

elem :: Eq a0 => a0 -> Either a a0 -> Bool #

maximum :: Ord a0 => Either a a0 -> a0 #

minimum :: Ord a0 => Either a a0 -> a0 #

sum :: Num a0 => Either a a0 -> a0 #

product :: Num a0 => Either a a0 -> a0 #

Foldable (Proxy :: TYPE LiftedRep -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Proxy m -> m #

foldMap :: Monoid m => (a -> m) -> Proxy a -> m #

foldMap' :: Monoid m => (a -> m) -> Proxy a -> m #

foldr :: (a -> b -> b) -> b -> Proxy a -> b #

foldr' :: (a -> b -> b) -> b -> Proxy a -> b #

foldl :: (b -> a -> b) -> b -> Proxy a -> b #

foldl' :: (b -> a -> b) -> b -> Proxy a -> b #

foldr1 :: (a -> a -> a) -> Proxy a -> a #

foldl1 :: (a -> a -> a) -> Proxy a -> a #

toList :: Proxy a -> [a] #

null :: Proxy a -> Bool #

length :: Proxy a -> Int #

elem :: Eq a => a -> Proxy a -> Bool #

maximum :: Ord a => Proxy a -> a #

minimum :: Ord a => Proxy a -> a #

sum :: Num a => Proxy a -> a #

product :: Num a => Proxy a -> a #

Foldable (Arg a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

fold :: Monoid m => Arg a m -> m #

foldMap :: Monoid m => (a0 -> m) -> Arg a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> Arg a a0 -> m #

foldr :: (a0 -> b -> b) -> b -> Arg a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Arg a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> Arg a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> Arg a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Arg a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> Arg a a0 -> a0 #

toList :: Arg a a0 -> [a0] #

null :: Arg a a0 -> Bool #

length :: Arg a a0 -> Int #

elem :: Eq a0 => a0 -> Arg a a0 -> Bool #

maximum :: Ord a0 => Arg a a0 -> a0 #

minimum :: Ord a0 => Arg a a0 -> a0 #

sum :: Num a0 => Arg a a0 -> a0 #

product :: Num a0 => Arg a a0 -> a0 #

Foldable (Array i)

Since: base-4.8.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Array i m -> m #

foldMap :: Monoid m => (a -> m) -> Array i a -> m #

foldMap' :: Monoid m => (a -> m) -> Array i a -> m #

foldr :: (a -> b -> b) -> b -> Array i a -> b #

foldr' :: (a -> b -> b) -> b -> Array i a -> b #

foldl :: (b -> a -> b) -> b -> Array i a -> b #

foldl' :: (b -> a -> b) -> b -> Array i a -> b #

foldr1 :: (a -> a -> a) -> Array i a -> a #

foldl1 :: (a -> a -> a) -> Array i a -> a #

toList :: Array i a -> [a] #

null :: Array i a -> Bool #

length :: Array i a -> Int #

elem :: Eq a => a -> Array i a -> Bool #

maximum :: Ord a => Array i a -> a #

minimum :: Ord a => Array i a -> a #

sum :: Num a => Array i a -> a #

product :: Num a => Array i a -> a #

Foldable (U1 :: TYPE LiftedRep -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => U1 m -> m #

foldMap :: Monoid m => (a -> m) -> U1 a -> m #

foldMap' :: Monoid m => (a -> m) -> U1 a -> m #

foldr :: (a -> b -> b) -> b -> U1 a -> b #

foldr' :: (a -> b -> b) -> b -> U1 a -> b #

foldl :: (b -> a -> b) -> b -> U1 a -> b #

foldl' :: (b -> a -> b) -> b -> U1 a -> b #

foldr1 :: (a -> a -> a) -> U1 a -> a #

foldl1 :: (a -> a -> a) -> U1 a -> a #

toList :: U1 a -> [a] #

null :: U1 a -> Bool #

length :: U1 a -> Int #

elem :: Eq a => a -> U1 a -> Bool #

maximum :: Ord a => U1 a -> a #

minimum :: Ord a => U1 a -> a #

sum :: Num a => U1 a -> a #

product :: Num a => U1 a -> a #

Foldable (UAddr :: TYPE LiftedRep -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => UAddr m -> m #

foldMap :: Monoid m => (a -> m) -> UAddr a -> m #

foldMap' :: Monoid m => (a -> m) -> UAddr a -> m #

foldr :: (a -> b -> b) -> b -> UAddr a -> b #

foldr' :: (a -> b -> b) -> b -> UAddr a -> b #

foldl :: (b -> a -> b) -> b -> UAddr a -> b #

foldl' :: (b -> a -> b) -> b -> UAddr a -> b #

foldr1 :: (a -> a -> a) -> UAddr a -> a #

foldl1 :: (a -> a -> a) -> UAddr a -> a #

toList :: UAddr a -> [a] #

null :: UAddr a -> Bool #

length :: UAddr a -> Int #

elem :: Eq a => a -> UAddr a -> Bool #

maximum :: Ord a => UAddr a -> a #

minimum :: Ord a => UAddr a -> a #

sum :: Num a => UAddr a -> a #

product :: Num a => UAddr a -> a #

Foldable (UChar :: TYPE LiftedRep -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => UChar m -> m #

foldMap :: Monoid m => (a -> m) -> UChar a -> m #

foldMap' :: Monoid m => (a -> m) -> UChar a -> m #

foldr :: (a -> b -> b) -> b -> UChar a -> b #

foldr' :: (a -> b -> b) -> b -> UChar a -> b #

foldl :: (b -> a -> b) -> b -> UChar a -> b #

foldl' :: (b -> a -> b) -> b -> UChar a -> b #

foldr1 :: (a -> a -> a) -> UChar a -> a #

foldl1 :: (a -> a -> a) -> UChar a -> a #

toList :: UChar a -> [a] #

null :: UChar a -> Bool #

length :: UChar a -> Int #

elem :: Eq a => a -> UChar a -> Bool #

maximum :: Ord a => UChar a -> a #

minimum :: Ord a => UChar a -> a #

sum :: Num a => UChar a -> a #

product :: Num a => UChar a -> a #

Foldable (UDouble :: TYPE LiftedRep -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => UDouble m -> m #

foldMap :: Monoid m => (a -> m) -> UDouble a -> m #

foldMap' :: Monoid m => (a -> m) -> UDouble a -> m #

foldr :: (a -> b -> b) -> b -> UDouble a -> b #

foldr' :: (a -> b -> b) -> b -> UDouble a -> b #

foldl :: (b -> a -> b) -> b -> UDouble a -> b #

foldl' :: (b -> a -> b) -> b -> UDouble a -> b #

foldr1 :: (a -> a -> a) -> UDouble a -> a #

foldl1 :: (a -> a -> a) -> UDouble a -> a #

toList :: UDouble a -> [a] #

null :: UDouble a -> Bool #

length :: UDouble a -> Int #

elem :: Eq a => a -> UDouble a -> Bool #

maximum :: Ord a => UDouble a -> a #

minimum :: Ord a => UDouble a -> a #

sum :: Num a => UDouble a -> a #

product :: Num a => UDouble a -> a #

Foldable (UFloat :: TYPE LiftedRep -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => UFloat m -> m #

foldMap :: Monoid m => (a -> m) -> UFloat a -> m #

foldMap' :: Monoid m => (a -> m) -> UFloat a -> m #

foldr :: (a -> b -> b) -> b -> UFloat a -> b #

foldr' :: (a -> b -> b) -> b -> UFloat a -> b #

foldl :: (b -> a -> b) -> b -> UFloat a -> b #

foldl' :: (b -> a -> b) -> b -> UFloat a -> b #

foldr1 :: (a -> a -> a) -> UFloat a -> a #

foldl1 :: (a -> a -> a) -> UFloat a -> a #

toList :: UFloat a -> [a] #

null :: UFloat a -> Bool #

length :: UFloat a -> Int #

elem :: Eq a => a -> UFloat a -> Bool #

maximum :: Ord a => UFloat a -> a #

minimum :: Ord a => UFloat a -> a #

sum :: Num a => UFloat a -> a #

product :: Num a => UFloat a -> a #

Foldable (UInt :: TYPE LiftedRep -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => UInt m -> m #

foldMap :: Monoid m => (a -> m) -> UInt a -> m #

foldMap' :: Monoid m => (a -> m) -> UInt a -> m #

foldr :: (a -> b -> b) -> b -> UInt a -> b #

foldr' :: (a -> b -> b) -> b -> UInt a -> b #

foldl :: (b -> a -> b) -> b -> UInt a -> b #

foldl' :: (b -> a -> b) -> b -> UInt a -> b #

foldr1 :: (a -> a -> a) -> UInt a -> a #

foldl1 :: (a -> a -> a) -> UInt a -> a #

toList :: UInt a -> [a] #

null :: UInt a -> Bool #

length :: UInt a -> Int #

elem :: Eq a => a -> UInt a -> Bool #

maximum :: Ord a => UInt a -> a #

minimum :: Ord a => UInt a -> a #

sum :: Num a => UInt a -> a #

product :: Num a => UInt a -> a #

Foldable (UWord :: TYPE LiftedRep -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => UWord m -> m #

foldMap :: Monoid m => (a -> m) -> UWord a -> m #

foldMap' :: Monoid m => (a -> m) -> UWord a -> m #

foldr :: (a -> b -> b) -> b -> UWord a -> b #

foldr' :: (a -> b -> b) -> b -> UWord a -> b #

foldl :: (b -> a -> b) -> b -> UWord a -> b #

foldl' :: (b -> a -> b) -> b -> UWord a -> b #

foldr1 :: (a -> a -> a) -> UWord a -> a #

foldl1 :: (a -> a -> a) -> UWord a -> a #

toList :: UWord a -> [a] #

null :: UWord a -> Bool #

length :: UWord a -> Int #

elem :: Eq a => a -> UWord a -> Bool #

maximum :: Ord a => UWord a -> a #

minimum :: Ord a => UWord a -> a #

sum :: Num a => UWord a -> a #

product :: Num a => UWord a -> a #

Foldable (V1 :: TYPE LiftedRep -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => V1 m -> m #

foldMap :: Monoid m => (a -> m) -> V1 a -> m #

foldMap' :: Monoid m => (a -> m) -> V1 a -> m #

foldr :: (a -> b -> b) -> b -> V1 a -> b #

foldr' :: (a -> b -> b) -> b -> V1 a -> b #

foldl :: (b -> a -> b) -> b -> V1 a -> b #

foldl' :: (b -> a -> b) -> b -> V1 a -> b #

foldr1 :: (a -> a -> a) -> V1 a -> a #

foldl1 :: (a -> a -> a) -> V1 a -> a #

toList :: V1 a -> [a] #

null :: V1 a -> Bool #

length :: V1 a -> Int #

elem :: Eq a => a -> V1 a -> Bool #

maximum :: Ord a => V1 a -> a #

minimum :: Ord a => V1 a -> a #

sum :: Num a => V1 a -> a #

product :: Num a => V1 a -> a #

Foldable (Map k)

Folds in order of increasing key.

Instance details

Defined in Data.Map.Internal

Methods

fold :: Monoid m => Map k m -> m #

foldMap :: Monoid m => (a -> m) -> Map k a -> m #

foldMap' :: Monoid m => (a -> m) -> Map k a -> m #

foldr :: (a -> b -> b) -> b -> Map k a -> b #

foldr' :: (a -> b -> b) -> b -> Map k a -> b #

foldl :: (b -> a -> b) -> b -> Map k a -> b #

foldl' :: (b -> a -> b) -> b -> Map k a -> b #

foldr1 :: (a -> a -> a) -> Map k a -> a #

foldl1 :: (a -> a -> a) -> Map k a -> a #

toList :: Map k a -> [a] #

null :: Map k a -> Bool #

length :: Map k a -> Int #

elem :: Eq a => a -> Map k a -> Bool #

maximum :: Ord a => Map k a -> a #

minimum :: Ord a => Map k a -> a #

sum :: Num a => Map k a -> a #

product :: Num a => Map k a -> a #

Foldable f => Foldable (Cofree f) 
Instance details

Defined in Control.Comonad.Cofree

Methods

fold :: Monoid m => Cofree f m -> m #

foldMap :: Monoid m => (a -> m) -> Cofree f a -> m #

foldMap' :: Monoid m => (a -> m) -> Cofree f a -> m #

foldr :: (a -> b -> b) -> b -> Cofree f a -> b #

foldr' :: (a -> b -> b) -> b -> Cofree f a -> b #

foldl :: (b -> a -> b) -> b -> Cofree f a -> b #

foldl' :: (b -> a -> b) -> b -> Cofree f a -> b #

foldr1 :: (a -> a -> a) -> Cofree f a -> a #

foldl1 :: (a -> a -> a) -> Cofree f a -> a #

toList :: Cofree f a -> [a] #

null :: Cofree f a -> Bool #

length :: Cofree f a -> Int #

elem :: Eq a => a -> Cofree f a -> Bool #

maximum :: Ord a => Cofree f a -> a #

minimum :: Ord a => Cofree f a -> a #

sum :: Num a => Cofree f a -> a #

product :: Num a => Cofree f a -> a #

Foldable f => Foldable (Free f) 
Instance details

Defined in Control.Monad.Free

Methods

fold :: Monoid m => Free f m -> m #

foldMap :: Monoid m => (a -> m) -> Free f a -> m #

foldMap' :: Monoid m => (a -> m) -> Free f a -> m #

foldr :: (a -> b -> b) -> b -> Free f a -> b #

foldr' :: (a -> b -> b) -> b -> Free f a -> b #

foldl :: (b -> a -> b) -> b -> Free f a -> b #

foldl' :: (b -> a -> b) -> b -> Free f a -> b #

foldr1 :: (a -> a -> a) -> Free f a -> a #

foldl1 :: (a -> a -> a) -> Free f a -> a #

toList :: Free f a -> [a] #

null :: Free f a -> Bool #

length :: Free f a -> Int #

elem :: Eq a => a -> Free f a -> Bool #

maximum :: Ord a => Free f a -> a #

minimum :: Ord a => Free f a -> a #

sum :: Num a => Free f a -> a #

product :: Num a => Free f a -> a #

Foldable f => Foldable (Yoneda f) 
Instance details

Defined in Data.Functor.Yoneda

Methods

fold :: Monoid m => Yoneda f m -> m #

foldMap :: Monoid m => (a -> m) -> Yoneda f a -> m #

foldMap' :: Monoid m => (a -> m) -> Yoneda f a -> m #

foldr :: (a -> b -> b) -> b -> Yoneda f a -> b #

foldr' :: (a -> b -> b) -> b -> Yoneda f a -> b #

foldl :: (b -> a -> b) -> b -> Yoneda f a -> b #

foldl' :: (b -> a -> b) -> b -> Yoneda f a -> b #

foldr1 :: (a -> a -> a) -> Yoneda f a -> a #

foldl1 :: (a -> a -> a) -> Yoneda f a -> a #

toList :: Yoneda f a -> [a] #

null :: Yoneda f a -> Bool #

length :: Yoneda f a -> Int #

elem :: Eq a => a -> Yoneda f a -> Bool #

maximum :: Ord a => Yoneda f a -> a #

minimum :: Ord a => Yoneda f a -> a #

sum :: Num a => Yoneda f a -> a #

product :: Num a => Yoneda f a -> a #

MonoFoldable mono => Foldable (WrappedMono mono) 
Instance details

Defined in Data.MonoTraversable

Methods

fold :: Monoid m => WrappedMono mono m -> m #

foldMap :: Monoid m => (a -> m) -> WrappedMono mono a -> m #

foldMap' :: Monoid m => (a -> m) -> WrappedMono mono a -> m #

foldr :: (a -> b -> b) -> b -> WrappedMono mono a -> b #

foldr' :: (a -> b -> b) -> b -> WrappedMono mono a -> b #

foldl :: (b -> a -> b) -> b -> WrappedMono mono a -> b #

foldl' :: (b -> a -> b) -> b -> WrappedMono mono a -> b #

foldr1 :: (a -> a -> a) -> WrappedMono mono a -> a #

foldl1 :: (a -> a -> a) -> WrappedMono mono a -> a #

toList :: WrappedMono mono a -> [a] #

null :: WrappedMono mono a -> Bool #

length :: WrappedMono mono a -> Int #

elem :: Eq a => a -> WrappedMono mono a -> Bool #

maximum :: Ord a => WrappedMono mono a -> a #

minimum :: Ord a => WrappedMono mono a -> a #

sum :: Num a => WrappedMono mono a -> a #

product :: Num a => WrappedMono mono a -> a #

Foldable f => Foldable (WrappedPoly f) 
Instance details

Defined in Data.MonoTraversable

Methods

fold :: Monoid m => WrappedPoly f m -> m #

foldMap :: Monoid m => (a -> m) -> WrappedPoly f a -> m #

foldMap' :: Monoid m => (a -> m) -> WrappedPoly f a -> m #

foldr :: (a -> b -> b) -> b -> WrappedPoly f a -> b #

foldr' :: (a -> b -> b) -> b -> WrappedPoly f a -> b #

foldl :: (b -> a -> b) -> b -> WrappedPoly f a -> b #

foldl' :: (b -> a -> b) -> b -> WrappedPoly f a -> b #

foldr1 :: (a -> a -> a) -> WrappedPoly f a -> a #

foldl1 :: (a -> a -> a) -> WrappedPoly f a -> a #

toList :: WrappedPoly f a -> [a] #

null :: WrappedPoly f a -> Bool #

length :: WrappedPoly f a -> Int #

elem :: Eq a => a -> WrappedPoly f a -> Bool #

maximum :: Ord a => WrappedPoly f a -> a #

minimum :: Ord a => WrappedPoly f a -> a #

sum :: Num a => WrappedPoly f a -> a #

product :: Num a => WrappedPoly f a -> a #

Foldable (Either e) 
Instance details

Defined in Data.Strict.Either

Methods

fold :: Monoid m => Either e m -> m #

foldMap :: Monoid m => (a -> m) -> Either e a -> m #

foldMap' :: Monoid m => (a -> m) -> Either e a -> m #

foldr :: (a -> b -> b) -> b -> Either e a -> b #

foldr' :: (a -> b -> b) -> b -> Either e a -> b #

foldl :: (b -> a -> b) -> b -> Either e a -> b #

foldl' :: (b -> a -> b) -> b -> Either e a -> b #

foldr1 :: (a -> a -> a) -> Either e a -> a #

foldl1 :: (a -> a -> a) -> Either e a -> a #

toList :: Either e a -> [a] #

null :: Either e a -> Bool #

length :: Either e a -> Int #

elem :: Eq a => a -> Either e a -> Bool #

maximum :: Ord a => Either e a -> a #

minimum :: Ord a => Either e a -> a #

sum :: Num a => Either e a -> a #

product :: Num a => Either e a -> a #

Foldable (These a) 
Instance details

Defined in Data.Strict.These

Methods

fold :: Monoid m => These a m -> m #

foldMap :: Monoid m => (a0 -> m) -> These a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> These a a0 -> m #

foldr :: (a0 -> b -> b) -> b -> These a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> These a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> These a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> These a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> These a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> These a a0 -> a0 #

toList :: These a a0 -> [a0] #

null :: These a a0 -> Bool #

length :: These a a0 -> Int #

elem :: Eq a0 => a0 -> These a a0 -> Bool #

maximum :: Ord a0 => These a a0 -> a0 #

minimum :: Ord a0 => These a a0 -> a0 #

sum :: Num a0 => These a a0 -> a0 #

product :: Num a0 => These a a0 -> a0 #

Foldable (Pair e) 
Instance details

Defined in Data.Strict.Tuple

Methods

fold :: Monoid m => Pair e m -> m #

foldMap :: Monoid m => (a -> m) -> Pair e a -> m #

foldMap' :: Monoid m => (a -> m) -> Pair e a -> m #

foldr :: (a -> b -> b) -> b -> Pair e a -> b #

foldr' :: (a -> b -> b) -> b -> Pair e a -> b #

foldl :: (b -> a -> b) -> b -> Pair e a -> b #

foldl' :: (b -> a -> b) -> b -> Pair e a -> b #

foldr1 :: (a -> a -> a) -> Pair e a -> a #

foldl1 :: (a -> a -> a) -> Pair e a -> a #

toList :: Pair e a -> [a] #

null :: Pair e a -> Bool #

length :: Pair e a -> Int #

elem :: Eq a => a -> Pair e a -> Bool #

maximum :: Ord a => Pair e a -> a #

minimum :: Ord a => Pair e a -> a #

sum :: Num a => Pair e a -> a #

product :: Num a => Pair e a -> a #

Foldable (These a) 
Instance details

Defined in Data.These

Methods

fold :: Monoid m => These a m -> m #

foldMap :: Monoid m => (a0 -> m) -> These a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> These a a0 -> m #

foldr :: (a0 -> b -> b) -> b -> These a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> These a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> These a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> These a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> These a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> These a a0 -> a0 #

toList :: These a a0 -> [a0] #

null :: These a a0 -> Bool #

length :: These a a0 -> Int #

elem :: Eq a0 => a0 -> These a a0 -> Bool #

maximum :: Ord a0 => These a a0 -> a0 #

minimum :: Ord a0 => These a a0 -> a0 #

sum :: Num a0 => These a a0 -> a0 #

product :: Num a0 => These a a0 -> a0 #

Foldable f => Foldable (Lift f) 
Instance details

Defined in Control.Applicative.Lift

Methods

fold :: Monoid m => Lift f m -> m #

foldMap :: Monoid m => (a -> m) -> Lift f a -> m #

foldMap' :: Monoid m => (a -> m) -> Lift f a -> m #

foldr :: (a -> b -> b) -> b -> Lift f a -> b #

foldr' :: (a -> b -> b) -> b -> Lift f a -> b #

foldl :: (b -> a -> b) -> b -> Lift f a -> b #

foldl' :: (b -> a -> b) -> b -> Lift f a -> b #

foldr1 :: (a -> a -> a) -> Lift f a -> a #

foldl1 :: (a -> a -> a) -> Lift f a -> a #

toList :: Lift f a -> [a] #

null :: Lift f a -> Bool #

length :: Lift f a -> Int #

elem :: Eq a => a -> Lift f a -> Bool #

maximum :: Ord a => Lift f a -> a #

minimum :: Ord a => Lift f a -> a #

sum :: Num a => Lift f a -> a #

product :: Num a => Lift f a -> a #

Foldable f => Foldable (ListT f) 
Instance details

Defined in Control.Monad.Trans.List

Methods

fold :: Monoid m => ListT f m -> m #

foldMap :: Monoid m => (a -> m) -> ListT f a -> m #

foldMap' :: Monoid m => (a -> m) -> ListT f a -> m #

foldr :: (a -> b -> b) -> b -> ListT f a -> b #

foldr' :: (a -> b -> b) -> b -> ListT f a -> b #

foldl :: (b -> a -> b) -> b -> ListT f a -> b #

foldl' :: (b -> a -> b) -> b -> ListT f a -> b #

foldr1 :: (a -> a -> a) -> ListT f a -> a #

foldl1 :: (a -> a -> a) -> ListT f a -> a #

toList :: ListT f a -> [a] #

null :: ListT f a -> Bool #

length :: ListT f a -> Int #

elem :: Eq a => a -> ListT f a -> Bool #

maximum :: Ord a => ListT f a -> a #

minimum :: Ord a => ListT f a -> a #

sum :: Num a => ListT f a -> a #

product :: Num a => ListT f a -> a #

Foldable f => Foldable (MaybeT f) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

fold :: Monoid m => MaybeT f m -> m #

foldMap :: Monoid m => (a -> m) -> MaybeT f a -> m #

foldMap' :: Monoid m => (a -> m) -> MaybeT f a -> m #

foldr :: (a -> b -> b) -> b -> MaybeT f a -> b #

foldr' :: (a -> b -> b) -> b -> MaybeT f a -> b #

foldl :: (b -> a -> b) -> b -> MaybeT f a -> b #

foldl' :: (b -> a -> b) -> b -> MaybeT f a -> b #

foldr1 :: (a -> a -> a) -> MaybeT f a -> a #

foldl1 :: (a -> a -> a) -> MaybeT f a -> a #

toList :: MaybeT f a -> [a] #

null :: MaybeT f a -> Bool #

length :: MaybeT f a -> Int #

elem :: Eq a => a -> MaybeT f a -> Bool #

maximum :: Ord a => MaybeT f a -> a #

minimum :: Ord a => MaybeT f a -> a #

sum :: Num a => MaybeT f a -> a #

product :: Num a => MaybeT f a -> a #

Foldable (HashMap k) 
Instance details

Defined in Data.HashMap.Internal

Methods

fold :: Monoid m => HashMap k m -> m #

foldMap :: Monoid m => (a -> m) -> HashMap k a -> m #

foldMap' :: Monoid m => (a -> m) -> HashMap k a -> m #

foldr :: (a -> b -> b) -> b -> HashMap k a -> b #

foldr' :: (a -> b -> b) -> b -> HashMap k a -> b #

foldl :: (b -> a -> b) -> b -> HashMap k a -> b #

foldl' :: (b -> a -> b) -> b -> HashMap k a -> b #

foldr1 :: (a -> a -> a) -> HashMap k a -> a #

foldl1 :: (a -> a -> a) -> HashMap k a -> a #

toList :: HashMap k a -> [a] #

null :: HashMap k a -> Bool #

length :: HashMap k a -> Int #

elem :: Eq a => a -> HashMap k a -> Bool #

maximum :: Ord a => HashMap k a -> a #

minimum :: Ord a => HashMap k a -> a #

sum :: Num a => HashMap k a -> a #

product :: Num a => HashMap k a -> a #

Foldable ((,) a)

Since: base-4.7.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => (a, m) -> m #

foldMap :: Monoid m => (a0 -> m) -> (a, a0) -> m #

foldMap' :: Monoid m => (a0 -> m) -> (a, a0) -> m #

foldr :: (a0 -> b -> b) -> b -> (a, a0) -> b #

foldr' :: (a0 -> b -> b) -> b -> (a, a0) -> b #

foldl :: (b -> a0 -> b) -> b -> (a, a0) -> b #

foldl' :: (b -> a0 -> b) -> b -> (a, a0) -> b #

foldr1 :: (a0 -> a0 -> a0) -> (a, a0) -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> (a, a0) -> a0 #

toList :: (a, a0) -> [a0] #

null :: (a, a0) -> Bool #

length :: (a, a0) -> Int #

elem :: Eq a0 => a0 -> (a, a0) -> Bool #

maximum :: Ord a0 => (a, a0) -> a0 #

minimum :: Ord a0 => (a, a0) -> a0 #

sum :: Num a0 => (a, a0) -> a0 #

product :: Num a0 => (a, a0) -> a0 #

Foldable (Const m :: TYPE LiftedRep -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Functor.Const

Methods

fold :: Monoid m0 => Const m m0 -> m0 #

foldMap :: Monoid m0 => (a -> m0) -> Const m a -> m0 #

foldMap' :: Monoid m0 => (a -> m0) -> Const m a -> m0 #

foldr :: (a -> b -> b) -> b -> Const m a -> b #

foldr' :: (a -> b -> b) -> b -> Const m a -> b #

foldl :: (b -> a -> b) -> b -> Const m a -> b #

foldl' :: (b -> a -> b) -> b -> Const m a -> b #

foldr1 :: (a -> a -> a) -> Const m a -> a #

foldl1 :: (a -> a -> a) -> Const m a -> a #

toList :: Const m a -> [a] #

null :: Const m a -> Bool #

length :: Const m a -> Int #

elem :: Eq a => a -> Const m a -> Bool #

maximum :: Ord a => Const m a -> a #

minimum :: Ord a => Const m a -> a #

sum :: Num a => Const m a -> a #

product :: Num a => Const m a -> a #

Foldable f => Foldable (Ap f)

Since: base-4.12.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Ap f m -> m #

foldMap :: Monoid m => (a -> m) -> Ap f a -> m #

foldMap' :: Monoid m => (a -> m) -> Ap f a -> m #

foldr :: (a -> b -> b) -> b -> Ap f a -> b #

foldr' :: (a -> b -> b) -> b -> Ap f a -> b #

foldl :: (b -> a -> b) -> b -> Ap f a -> b #

foldl' :: (b -> a -> b) -> b -> Ap f a -> b #

foldr1 :: (a -> a -> a) -> Ap f a -> a #

foldl1 :: (a -> a -> a) -> Ap f a -> a #

toList :: Ap f a -> [a] #

null :: Ap f a -> Bool #

length :: Ap f a -> Int #

elem :: Eq a => a -> Ap f a -> Bool #

maximum :: Ord a => Ap f a -> a #

minimum :: Ord a => Ap f a -> a #

sum :: Num a => Ap f a -> a #

product :: Num a => Ap f a -> a #

Foldable f => Foldable (Alt f)

Since: base-4.12.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Alt f m -> m #

foldMap :: Monoid m => (a -> m) -> Alt f a -> m #

foldMap' :: Monoid m => (a -> m) -> Alt f a -> m #

foldr :: (a -> b -> b) -> b -> Alt f a -> b #

foldr' :: (a -> b -> b) -> b -> Alt f a -> b #

foldl :: (b -> a -> b) -> b -> Alt f a -> b #

foldl' :: (b -> a -> b) -> b -> Alt f a -> b #

foldr1 :: (a -> a -> a) -> Alt f a -> a #

foldl1 :: (a -> a -> a) -> Alt f a -> a #

toList :: Alt f a -> [a] #

null :: Alt f a -> Bool #

length :: Alt f a -> Int #

elem :: Eq a => a -> Alt f a -> Bool #

maximum :: Ord a => Alt f a -> a #

minimum :: Ord a => Alt f a -> a #

sum :: Num a => Alt f a -> a #

product :: Num a => Alt f a -> a #

Foldable f => Foldable (Rec1 f)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Rec1 f m -> m #

foldMap :: Monoid m => (a -> m) -> Rec1 f a -> m #

foldMap' :: Monoid m => (a -> m) -> Rec1 f a -> m #

foldr :: (a -> b -> b) -> b -> Rec1 f a -> b #

foldr' :: (a -> b -> b) -> b -> Rec1 f a -> b #

foldl :: (b -> a -> b) -> b -> Rec1 f a -> b #

foldl' :: (b -> a -> b) -> b -> Rec1 f a -> b #

foldr1 :: (a -> a -> a) -> Rec1 f a -> a #

foldl1 :: (a -> a -> a) -> Rec1 f a -> a #

toList :: Rec1 f a -> [a] #

null :: Rec1 f a -> Bool #

length :: Rec1 f a -> Int #

elem :: Eq a => a -> Rec1 f a -> Bool #

maximum :: Ord a => Rec1 f a -> a #

minimum :: Ord a => Rec1 f a -> a #

sum :: Num a => Rec1 f a -> a #

product :: Num a => Rec1 f a -> a #

Bifoldable p => Foldable (Fix p) 
Instance details

Defined in Data.Bifunctor.Fix

Methods

fold :: Monoid m => Fix p m -> m #

foldMap :: Monoid m => (a -> m) -> Fix p a -> m #

foldMap' :: Monoid m => (a -> m) -> Fix p a -> m #

foldr :: (a -> b -> b) -> b -> Fix p a -> b #

foldr' :: (a -> b -> b) -> b -> Fix p a -> b #

foldl :: (b -> a -> b) -> b -> Fix p a -> b #

foldl' :: (b -> a -> b) -> b -> Fix p a -> b #

foldr1 :: (a -> a -> a) -> Fix p a -> a #

foldl1 :: (a -> a -> a) -> Fix p a -> a #

toList :: Fix p a -> [a] #

null :: Fix p a -> Bool #

length :: Fix p a -> Int #

elem :: Eq a => a -> Fix p a -> Bool #

maximum :: Ord a => Fix p a -> a #

minimum :: Ord a => Fix p a -> a #

sum :: Num a => Fix p a -> a #

product :: Num a => Fix p a -> a #

Bifoldable p => Foldable (Join p) 
Instance details

Defined in Data.Bifunctor.Join

Methods

fold :: Monoid m => Join p m -> m #

foldMap :: Monoid m => (a -> m) -> Join p a -> m #

foldMap' :: Monoid m => (a -> m) -> Join p a -> m #

foldr :: (a -> b -> b) -> b -> Join p a -> b #

foldr' :: (a -> b -> b) -> b -> Join p a -> b #

foldl :: (b -> a -> b) -> b -> Join p a -> b #

foldl' :: (b -> a -> b) -> b -> Join p a -> b #

foldr1 :: (a -> a -> a) -> Join p a -> a #

foldl1 :: (a -> a -> a) -> Join p a -> a #

toList :: Join p a -> [a] #

null :: Join p a -> Bool #

length :: Join p a -> Int #

elem :: Eq a => a -> Join p a -> Bool #

maximum :: Ord a => Join p a -> a #

minimum :: Ord a => Join p a -> a #

sum :: Num a => Join p a -> a #

product :: Num a => Join p a -> a #

Foldable f => Foldable (CofreeF f a) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

fold :: Monoid m => CofreeF f a m -> m #

foldMap :: Monoid m => (a0 -> m) -> CofreeF f a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> CofreeF f a a0 -> m #

foldr :: (a0 -> b -> b) -> b -> CofreeF f a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> CofreeF f a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> CofreeF f a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> CofreeF f a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> CofreeF f a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> CofreeF f a a0 -> a0 #

toList :: CofreeF f a a0 -> [a0] #

null :: CofreeF f a a0 -> Bool #

length :: CofreeF f a a0 -> Int #

elem :: Eq a0 => a0 -> CofreeF f a a0 -> Bool #

maximum :: Ord a0 => CofreeF f a a0 -> a0 #

minimum :: Ord a0 => CofreeF f a a0 -> a0 #

sum :: Num a0 => CofreeF f a a0 -> a0 #

product :: Num a0 => CofreeF f a a0 -> a0 #

(Foldable f, Foldable w) => Foldable (CofreeT f w) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

fold :: Monoid m => CofreeT f w m -> m #

foldMap :: Monoid m => (a -> m) -> CofreeT f w a -> m #

foldMap' :: Monoid m => (a -> m) -> CofreeT f w a -> m #

foldr :: (a -> b -> b) -> b -> CofreeT f w a -> b #

foldr' :: (a -> b -> b) -> b -> CofreeT f w a -> b #

foldl :: (b -> a -> b) -> b -> CofreeT f w a -> b #

foldl' :: (b -> a -> b) -> b -> CofreeT f w a -> b #

foldr1 :: (a -> a -> a) -> CofreeT f w a -> a #

foldl1 :: (a -> a -> a) -> CofreeT f w a -> a #

toList :: CofreeT f w a -> [a] #

null :: CofreeT f w a -> Bool #

length :: CofreeT f w a -> Int #

elem :: Eq a => a -> CofreeT f w a -> Bool #

maximum :: Ord a => CofreeT f w a -> a #

minimum :: Ord a => CofreeT f w a -> a #

sum :: Num a => CofreeT f w a -> a #

product :: Num a => CofreeT f w a -> a #

Foldable f => Foldable (FreeF f a) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

fold :: Monoid m => FreeF f a m -> m #

foldMap :: Monoid m => (a0 -> m) -> FreeF f a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> FreeF f a a0 -> m #

foldr :: (a0 -> b -> b) -> b -> FreeF f a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> FreeF f a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> FreeF f a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> FreeF f a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> FreeF f a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> FreeF f a a0 -> a0 #

toList :: FreeF f a a0 -> [a0] #

null :: FreeF f a a0 -> Bool #

length :: FreeF f a a0 -> Int #

elem :: Eq a0 => a0 -> FreeF f a a0 -> Bool #

maximum :: Ord a0 => FreeF f a a0 -> a0 #

minimum :: Ord a0 => FreeF f a a0 -> a0 #

sum :: Num a0 => FreeF f a a0 -> a0 #

product :: Num a0 => FreeF f a a0 -> a0 #

(Foldable m, Foldable f) => Foldable (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

fold :: Monoid m0 => FreeT f m m0 -> m0 #

foldMap :: Monoid m0 => (a -> m0) -> FreeT f m a -> m0 #

foldMap' :: Monoid m0 => (a -> m0) -> FreeT f m a -> m0 #

foldr :: (a -> b -> b) -> b -> FreeT f m a -> b #

foldr' :: (a -> b -> b) -> b -> FreeT f m a -> b #

foldl :: (b -> a -> b) -> b -> FreeT f m a -> b #

foldl' :: (b -> a -> b) -> b -> FreeT f m a -> b #

foldr1 :: (a -> a -> a) -> FreeT f m a -> a #

foldl1 :: (a -> a -> a) -> FreeT f m a -> a #

toList :: FreeT f m a -> [a] #

null :: FreeT f m a -> Bool #

length :: FreeT f m a -> Int #

elem :: Eq a => a -> FreeT f m a -> Bool #

maximum :: Ord a => FreeT f m a -> a #

minimum :: Ord a => FreeT f m a -> a #

sum :: Num a => FreeT f m a -> a #

product :: Num a => FreeT f m a -> a #

Foldable (Tagged s) 
Instance details

Defined in Data.Tagged

Methods

fold :: Monoid m => Tagged s m -> m #

foldMap :: Monoid m => (a -> m) -> Tagged s a -> m #

foldMap' :: Monoid m => (a -> m) -> Tagged s a -> m #

foldr :: (a -> b -> b) -> b -> Tagged s a -> b #

foldr' :: (a -> b -> b) -> b -> Tagged s a -> b #

foldl :: (b -> a -> b) -> b -> Tagged s a -> b #

foldl' :: (b -> a -> b) -> b -> Tagged s a -> b #

foldr1 :: (a -> a -> a) -> Tagged s a -> a #

foldl1 :: (a -> a -> a) -> Tagged s a -> a #

toList :: Tagged s a -> [a] #

null :: Tagged s a -> Bool #

length :: Tagged s a -> Int #

elem :: Eq a => a -> Tagged s a -> Bool #

maximum :: Ord a => Tagged s a -> a #

minimum :: Ord a => Tagged s a -> a #

sum :: Num a => Tagged s a -> a #

product :: Num a => Tagged s a -> a #

(Foldable f, Foldable g) => Foldable (These1 f g) 
Instance details

Defined in Data.Functor.These

Methods

fold :: Monoid m => These1 f g m -> m #

foldMap :: Monoid m => (a -> m) -> These1 f g a -> m #

foldMap' :: Monoid m => (a -> m) -> These1 f g a -> m #

foldr :: (a -> b -> b) -> b -> These1 f g a -> b #

foldr' :: (a -> b -> b) -> b -> These1 f g a -> b #

foldl :: (b -> a -> b) -> b -> These1 f g a -> b #

foldl' :: (b -> a -> b) -> b -> These1 f g a -> b #

foldr1 :: (a -> a -> a) -> These1 f g a -> a #

foldl1 :: (a -> a -> a) -> These1 f g a -> a #

toList :: These1 f g a -> [a] #

null :: These1 f g a -> Bool #

length :: These1 f g a -> Int #

elem :: Eq a => a -> These1 f g a -> Bool #

maximum :: Ord a => These1 f g a -> a #

minimum :: Ord a => These1 f g a -> a #

sum :: Num a => These1 f g a -> a #

product :: Num a => These1 f g a -> a #

Foldable f => Foldable (Backwards f)

Derived instance.

Instance details

Defined in Control.Applicative.Backwards

Methods

fold :: Monoid m => Backwards f m -> m #

foldMap :: Monoid m => (a -> m) -> Backwards f a -> m #

foldMap' :: Monoid m => (a -> m) -> Backwards f a -> m #

foldr :: (a -> b -> b) -> b -> Backwards f a -> b #

foldr' :: (a -> b -> b) -> b -> Backwards f a -> b #

foldl :: (b -> a -> b) -> b -> Backwards f a -> b #

foldl' :: (b -> a -> b) -> b -> Backwards f a -> b #

foldr1 :: (a -> a -> a) -> Backwards f a -> a #

foldl1 :: (a -> a -> a) -> Backwards f a -> a #

toList :: Backwards f a -> [a] #

null :: Backwards f a -> Bool #

length :: Backwards f a -> Int #

elem :: Eq a => a -> Backwards f a -> Bool #

maximum :: Ord a => Backwards f a -> a #

minimum :: Ord a => Backwards f a -> a #

sum :: Num a => Backwards f a -> a #

product :: Num a => Backwards f a -> a #

Foldable f => Foldable (ErrorT e f) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

fold :: Monoid m => ErrorT e f m -> m #

foldMap :: Monoid m => (a -> m) -> ErrorT e f a -> m #

foldMap' :: Monoid m => (a -> m) -> ErrorT e f a -> m #

foldr :: (a -> b -> b) -> b -> ErrorT e f a -> b #

foldr' :: (a -> b -> b) -> b -> ErrorT e f a -> b #

foldl :: (b -> a -> b) -> b -> ErrorT e f a -> b #

foldl' :: (b -> a -> b) -> b -> ErrorT e f a -> b #

foldr1 :: (a -> a -> a) -> ErrorT e f a -> a #

foldl1 :: (a -> a -> a) -> ErrorT e f a -> a #

toList :: ErrorT e f a -> [a] #

null :: ErrorT e f a -> Bool #

length :: ErrorT e f a -> Int #

elem :: Eq a => a -> ErrorT e f a -> Bool #

maximum :: Ord a => ErrorT e f a -> a #

minimum :: Ord a => ErrorT e f a -> a #

sum :: Num a => ErrorT e f a -> a #

product :: Num a => ErrorT e f a -> a #

Foldable f => Foldable (ExceptT e f) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

fold :: Monoid m => ExceptT e f m -> m #

foldMap :: Monoid m => (a -> m) -> ExceptT e f a -> m #

foldMap' :: Monoid m => (a -> m) -> ExceptT e f a -> m #

foldr :: (a -> b -> b) -> b -> ExceptT e f a -> b #

foldr' :: (a -> b -> b) -> b -> ExceptT e f a -> b #

foldl :: (b -> a -> b) -> b -> ExceptT e f a -> b #

foldl' :: (b -> a -> b) -> b -> ExceptT e f a -> b #

foldr1 :: (a -> a -> a) -> ExceptT e f a -> a #

foldl1 :: (a -> a -> a) -> ExceptT e f a -> a #

toList :: ExceptT e f a -> [a] #

null :: ExceptT e f a -> Bool #

length :: ExceptT e f a -> Int #

elem :: Eq a => a -> ExceptT e f a -> Bool #

maximum :: Ord a => ExceptT e f a -> a #

minimum :: Ord a => ExceptT e f a -> a #

sum :: Num a => ExceptT e f a -> a #

product :: Num a => ExceptT e f a -> a #

Foldable f => Foldable (IdentityT f) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

fold :: Monoid m => IdentityT f m -> m #

foldMap :: Monoid m => (a -> m) -> IdentityT f a -> m #

foldMap' :: Monoid m => (a -> m) -> IdentityT f a -> m #

foldr :: (a -> b -> b) -> b -> IdentityT f a -> b #

foldr' :: (a -> b -> b) -> b -> IdentityT f a -> b #

foldl :: (b -> a -> b) -> b -> IdentityT f a -> b #

foldl' :: (b -> a -> b) -> b -> IdentityT f a -> b #

foldr1 :: (a -> a -> a) -> IdentityT f a -> a #

foldl1 :: (a -> a -> a) -> IdentityT f a -> a #

toList :: IdentityT f a -> [a] #

null :: IdentityT f a -> Bool #

length :: IdentityT f a -> Int #

elem :: Eq a => a -> IdentityT f a -> Bool #

maximum :: Ord a => IdentityT f a -> a #

minimum :: Ord a => IdentityT f a -> a #

sum :: Num a => IdentityT f a -> a #

product :: Num a => IdentityT f a -> a #

Foldable f => Foldable (WriterT w f) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

fold :: Monoid m => WriterT w f m -> m #

foldMap :: Monoid m => (a -> m) -> WriterT w f a -> m #

foldMap' :: Monoid m => (a -> m) -> WriterT w f a -> m #

foldr :: (a -> b -> b) -> b -> WriterT w f a -> b #

foldr' :: (a -> b -> b) -> b -> WriterT w f a -> b #

foldl :: (b -> a -> b) -> b -> WriterT w f a -> b #

foldl' :: (b -> a -> b) -> b -> WriterT w f a -> b #

foldr1 :: (a -> a -> a) -> WriterT w f a -> a #

foldl1 :: (a -> a -> a) -> WriterT w f a -> a #

toList :: WriterT w f a -> [a] #

null :: WriterT w f a -> Bool #

length :: WriterT w f a -> Int #

elem :: Eq a => a -> WriterT w f a -> Bool #

maximum :: Ord a => WriterT w f a -> a #

minimum :: Ord a => WriterT w f a -> a #

sum :: Num a => WriterT w f a -> a #

product :: Num a => WriterT w f a -> a #

Foldable f => Foldable (WriterT w f) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

fold :: Monoid m => WriterT w f m -> m #

foldMap :: Monoid m => (a -> m) -> WriterT w f a -> m #

foldMap' :: Monoid m => (a -> m) -> WriterT w f a -> m #

foldr :: (a -> b -> b) -> b -> WriterT w f a -> b #

foldr' :: (a -> b -> b) -> b -> WriterT w f a -> b #

foldl :: (b -> a -> b) -> b -> WriterT w f a -> b #

foldl' :: (b -> a -> b) -> b -> WriterT w f a -> b #

foldr1 :: (a -> a -> a) -> WriterT w f a -> a #

foldl1 :: (a -> a -> a) -> WriterT w f a -> a #

toList :: WriterT w f a -> [a] #

null :: WriterT w f a -> Bool #

length :: WriterT w f a -> Int #

elem :: Eq a => a -> WriterT w f a -> Bool #

maximum :: Ord a => WriterT w f a -> a #

minimum :: Ord a => WriterT w f a -> a #

sum :: Num a => WriterT w f a -> a #

product :: Num a => WriterT w f a -> a #

Foldable (Constant a :: TYPE LiftedRep -> Type) 
Instance details

Defined in Data.Functor.Constant

Methods

fold :: Monoid m => Constant a m -> m #

foldMap :: Monoid m => (a0 -> m) -> Constant a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> Constant a a0 -> m #

foldr :: (a0 -> b -> b) -> b -> Constant a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Constant a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> Constant a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> Constant a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Constant a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> Constant a a0 -> a0 #

toList :: Constant a a0 -> [a0] #

null :: Constant a a0 -> Bool #

length :: Constant a a0 -> Int #

elem :: Eq a0 => a0 -> Constant a a0 -> Bool #

maximum :: Ord a0 => Constant a a0 -> a0 #

minimum :: Ord a0 => Constant a a0 -> a0 #

sum :: Num a0 => Constant a a0 -> a0 #

product :: Num a0 => Constant a a0 -> a0 #

Foldable f => Foldable (Reverse f)

Fold from right to left.

Instance details

Defined in Data.Functor.Reverse

Methods

fold :: Monoid m => Reverse f m -> m #

foldMap :: Monoid m => (a -> m) -> Reverse f a -> m #

foldMap' :: Monoid m => (a -> m) -> Reverse f a -> m #

foldr :: (a -> b -> b) -> b -> Reverse f a -> b #

foldr' :: (a -> b -> b) -> b -> Reverse f a -> b #

foldl :: (b -> a -> b) -> b -> Reverse f a -> b #

foldl' :: (b -> a -> b) -> b -> Reverse f a -> b #

foldr1 :: (a -> a -> a) -> Reverse f a -> a #

foldl1 :: (a -> a -> a) -> Reverse f a -> a #

toList :: Reverse f a -> [a] #

null :: Reverse f a -> Bool #

length :: Reverse f a -> Int #

elem :: Eq a => a -> Reverse f a -> Bool #

maximum :: Ord a => Reverse f a -> a #

minimum :: Ord a => Reverse f a -> a #

sum :: Num a => Reverse f a -> a #

product :: Num a => Reverse f a -> a #

(Foldable f, Foldable g) => Foldable (Product f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Product

Methods

fold :: Monoid m => Product f g m -> m #

foldMap :: Monoid m => (a -> m) -> Product f g a -> m #

foldMap' :: Monoid m => (a -> m) -> Product f g a -> m #

foldr :: (a -> b -> b) -> b -> Product f g a -> b #

foldr' :: (a -> b -> b) -> b -> Product f g a -> b #

foldl :: (b -> a -> b) -> b -> Product f g a -> b #

foldl' :: (b -> a -> b) -> b -> Product f g a -> b #

foldr1 :: (a -> a -> a) -> Product f g a -> a #

foldl1 :: (a -> a -> a) -> Product f g a -> a #

toList :: Product f g a -> [a] #

null :: Product f g a -> Bool #

length :: Product f g a -> Int #

elem :: Eq a => a -> Product f g a -> Bool #

maximum :: Ord a => Product f g a -> a #

minimum :: Ord a => Product f g a -> a #

sum :: Num a => Product f g a -> a #

product :: Num a => Product f g a -> a #

(Foldable f, Foldable g) => Foldable (Sum f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Sum

Methods

fold :: Monoid m => Sum f g m -> m #

foldMap :: Monoid m => (a -> m) -> Sum f g a -> m #

foldMap' :: Monoid m => (a -> m) -> Sum f g a -> m #

foldr :: (a -> b -> b) -> b -> Sum f g a -> b #

foldr' :: (a -> b -> b) -> b -> Sum f g a -> b #

foldl :: (b -> a -> b) -> b -> Sum f g a -> b #

foldl' :: (b -> a -> b) -> b -> Sum f g a -> b #

foldr1 :: (a -> a -> a) -> Sum f g a -> a #

foldl1 :: (a -> a -> a) -> Sum f g a -> a #

toList :: Sum f g a -> [a] #

null :: Sum f g a -> Bool #

length :: Sum f g a -> Int #

elem :: Eq a => a -> Sum f g a -> Bool #

maximum :: Ord a => Sum f g a -> a #

minimum :: Ord a => Sum f g a -> a #

sum :: Num a => Sum f g a -> a #

product :: Num a => Sum f g a -> a #

(Foldable f, Foldable g) => Foldable (f :*: g)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => (f :*: g) m -> m #

foldMap :: Monoid m => (a -> m) -> (f :*: g) a -> m #

foldMap' :: Monoid m => (a -> m) -> (f :*: g) a -> m #

foldr :: (a -> b -> b) -> b -> (f :*: g) a -> b #

foldr' :: (a -> b -> b) -> b -> (f :*: g) a -> b #

foldl :: (b -> a -> b) -> b -> (f :*: g) a -> b #

foldl' :: (b -> a -> b) -> b -> (f :*: g) a -> b #

foldr1 :: (a -> a -> a) -> (f :*: g) a -> a #

foldl1 :: (a -> a -> a) -> (f :*: g) a -> a #

toList :: (f :*: g) a -> [a] #

null :: (f :*: g) a -> Bool #

length :: (f :*: g) a -> Int #

elem :: Eq a => a -> (f :*: g) a -> Bool #

maximum :: Ord a => (f :*: g) a -> a #

minimum :: Ord a => (f :*: g) a -> a #

sum :: Num a => (f :*: g) a -> a #

product :: Num a => (f :*: g) a -> a #

(Foldable f, Foldable g) => Foldable (f :+: g)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => (f :+: g) m -> m #

foldMap :: Monoid m => (a -> m) -> (f :+: g) a -> m #

foldMap' :: Monoid m => (a -> m) -> (f :+: g) a -> m #

foldr :: (a -> b -> b) -> b -> (f :+: g) a -> b #

foldr' :: (a -> b -> b) -> b -> (f :+: g) a -> b #

foldl :: (b -> a -> b) -> b -> (f :+: g) a -> b #

foldl' :: (b -> a -> b) -> b -> (f :+: g) a -> b #

foldr1 :: (a -> a -> a) -> (f :+: g) a -> a #

foldl1 :: (a -> a -> a) -> (f :+: g) a -> a #

toList :: (f :+: g) a -> [a] #

null :: (f :+: g) a -> Bool #

length :: (f :+: g) a -> Int #

elem :: Eq a => a -> (f :+: g) a -> Bool #

maximum :: Ord a => (f :+: g) a -> a #

minimum :: Ord a => (f :+: g) a -> a #

sum :: Num a => (f :+: g) a -> a #

product :: Num a => (f :+: g) a -> a #

Foldable (K1 i c :: TYPE LiftedRep -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => K1 i c m -> m #

foldMap :: Monoid m => (a -> m) -> K1 i c a -> m #

foldMap' :: Monoid m => (a -> m) -> K1 i c a -> m #

foldr :: (a -> b -> b) -> b -> K1 i c a -> b #

foldr' :: (a -> b -> b) -> b -> K1 i c a -> b #

foldl :: (b -> a -> b) -> b -> K1 i c a -> b #

foldl' :: (b -> a -> b) -> b -> K1 i c a -> b #

foldr1 :: (a -> a -> a) -> K1 i c a -> a #

foldl1 :: (a -> a -> a) -> K1 i c a -> a #

toList :: K1 i c a -> [a] #

null :: K1 i c a -> Bool #

length :: K1 i c a -> Int #

elem :: Eq a => a -> K1 i c a -> Bool #

maximum :: Ord a => K1 i c a -> a #

minimum :: Ord a => K1 i c a -> a #

sum :: Num a => K1 i c a -> a #

product :: Num a => K1 i c a -> a #

(Foldable f, Foldable g) => Foldable (Compose f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

fold :: Monoid m => Compose f g m -> m #

foldMap :: Monoid m => (a -> m) -> Compose f g a -> m #

foldMap' :: Monoid m => (a -> m) -> Compose f g a -> m #

foldr :: (a -> b -> b) -> b -> Compose f g a -> b #

foldr' :: (a -> b -> b) -> b -> Compose f g a -> b #

foldl :: (b -> a -> b) -> b -> Compose f g a -> b #

foldl' :: (b -> a -> b) -> b -> Compose f g a -> b #

foldr1 :: (a -> a -> a) -> Compose f g a -> a #

foldl1 :: (a -> a -> a) -> Compose f g a -> a #

toList :: Compose f g a -> [a] #

null :: Compose f g a -> Bool #

length :: Compose f g a -> Int #

elem :: Eq a => a -> Compose f g a -> Bool #

maximum :: Ord a => Compose f g a -> a #

minimum :: Ord a => Compose f g a -> a #

sum :: Num a => Compose f g a -> a #

product :: Num a => Compose f g a -> a #

(Foldable f, Foldable g) => Foldable (f :.: g)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => (f :.: g) m -> m #

foldMap :: Monoid m => (a -> m) -> (f :.: g) a -> m #

foldMap' :: Monoid m => (a -> m) -> (f :.: g) a -> m #

foldr :: (a -> b -> b) -> b -> (f :.: g) a -> b #

foldr' :: (a -> b -> b) -> b -> (f :.: g) a -> b #

foldl :: (b -> a -> b) -> b -> (f :.: g) a -> b #

foldl' :: (b -> a -> b) -> b -> (f :.: g) a -> b #

foldr1 :: (a -> a -> a) -> (f :.: g) a -> a #

foldl1 :: (a -> a -> a) -> (f :.: g) a -> a #

toList :: (f :.: g) a -> [a] #

null :: (f :.: g) a -> Bool #

length :: (f :.: g) a -> Int #

elem :: Eq a => a -> (f :.: g) a -> Bool #

maximum :: Ord a => (f :.: g) a -> a #

minimum :: Ord a => (f :.: g) a -> a #

sum :: Num a => (f :.: g) a -> a #

product :: Num a => (f :.: g) a -> a #

Foldable f => Foldable (M1 i c f)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => M1 i c f m -> m #

foldMap :: Monoid m => (a -> m) -> M1 i c f a -> m #

foldMap' :: Monoid m => (a -> m) -> M1 i c f a -> m #

foldr :: (a -> b -> b) -> b -> M1 i c f a -> b #

foldr' :: (a -> b -> b) -> b -> M1 i c f a -> b #

foldl :: (b -> a -> b) -> b -> M1 i c f a -> b #

foldl' :: (b -> a -> b) -> b -> M1 i c f a -> b #

foldr1 :: (a -> a -> a) -> M1 i c f a -> a #

foldl1 :: (a -> a -> a) -> M1 i c f a -> a #

toList :: M1 i c f a -> [a] #

null :: M1 i c f a -> Bool #

length :: M1 i c f a -> Int #

elem :: Eq a => a -> M1 i c f a -> Bool #

maximum :: Ord a => M1 i c f a -> a #

minimum :: Ord a => M1 i c f a -> a #

sum :: Num a => M1 i c f a -> a #

product :: Num a => M1 i c f a -> a #

Foldable (Clown f a :: TYPE LiftedRep -> Type) 
Instance details

Defined in Data.Bifunctor.Clown

Methods

fold :: Monoid m => Clown f a m -> m #

foldMap :: Monoid m => (a0 -> m) -> Clown f a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> Clown f a a0 -> m #

foldr :: (a0 -> b -> b) -> b -> Clown f a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Clown f a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> Clown f a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> Clown f a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Clown f a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> Clown f a a0 -> a0 #

toList :: Clown f a a0 -> [a0] #

null :: Clown f a a0 -> Bool #

length :: Clown f a a0 -> Int #

elem :: Eq a0 => a0 -> Clown f a a0 -> Bool #

maximum :: Ord a0 => Clown f a a0 -> a0 #

minimum :: Ord a0 => Clown f a a0 -> a0 #

sum :: Num a0 => Clown f a a0 -> a0 #

product :: Num a0 => Clown f a a0 -> a0 #

Bifoldable p => Foldable (Flip p a) 
Instance details

Defined in Data.Bifunctor.Flip

Methods

fold :: Monoid m => Flip p a m -> m #

foldMap :: Monoid m => (a0 -> m) -> Flip p a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> Flip p a a0 -> m #

foldr :: (a0 -> b -> b) -> b -> Flip p a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Flip p a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> Flip p a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> Flip p a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Flip p a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> Flip p a a0 -> a0 #

toList :: Flip p a a0 -> [a0] #

null :: Flip p a a0 -> Bool #

length :: Flip p a a0 -> Int #

elem :: Eq a0 => a0 -> Flip p a a0 -> Bool #

maximum :: Ord a0 => Flip p a a0 -> a0 #

minimum :: Ord a0 => Flip p a a0 -> a0 #

sum :: Num a0 => Flip p a a0 -> a0 #

product :: Num a0 => Flip p a a0 -> a0 #

Foldable g => Foldable (Joker g a) 
Instance details

Defined in Data.Bifunctor.Joker

Methods

fold :: Monoid m => Joker g a m -> m #

foldMap :: Monoid m => (a0 -> m) -> Joker g a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> Joker g a a0 -> m #

foldr :: (a0 -> b -> b) -> b -> Joker g a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Joker g a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> Joker g a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> Joker g a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Joker g a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> Joker g a a0 -> a0 #

toList :: Joker g a a0 -> [a0] #

null :: Joker g a a0 -> Bool #

length :: Joker g a a0 -> Int #

elem :: Eq a0 => a0 -> Joker g a a0 -> Bool #

maximum :: Ord a0 => Joker g a a0 -> a0 #

minimum :: Ord a0 => Joker g a a0 -> a0 #

sum :: Num a0 => Joker g a a0 -> a0 #

product :: Num a0 => Joker g a a0 -> a0 #

Bifoldable p => Foldable (WrappedBifunctor p a) 
Instance details

Defined in Data.Bifunctor.Wrapped

Methods

fold :: Monoid m => WrappedBifunctor p a m -> m #

foldMap :: Monoid m => (a0 -> m) -> WrappedBifunctor p a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> WrappedBifunctor p a a0 -> m #

foldr :: (a0 -> b -> b) -> b -> WrappedBifunctor p a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> WrappedBifunctor p a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> WrappedBifunctor p a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> WrappedBifunctor p a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> WrappedBifunctor p a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> WrappedBifunctor p a a0 -> a0 #

toList :: WrappedBifunctor p a a0 -> [a0] #

null :: WrappedBifunctor p a a0 -> Bool #

length :: WrappedBifunctor p a a0 -> Int #

elem :: Eq a0 => a0 -> WrappedBifunctor p a a0 -> Bool #

maximum :: Ord a0 => WrappedBifunctor p a a0 -> a0 #

minimum :: Ord a0 => WrappedBifunctor p a a0 -> a0 #

sum :: Num a0 => WrappedBifunctor p a a0 -> a0 #

product :: Num a0 => WrappedBifunctor p a a0 -> a0 #

(Foldable (f a), Foldable (g a)) => Foldable (Product f g a) 
Instance details

Defined in Data.Bifunctor.Product

Methods

fold :: Monoid m => Product f g a m -> m #

foldMap :: Monoid m => (a0 -> m) -> Product f g a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> Product f g a a0 -> m #

foldr :: (a0 -> b -> b) -> b -> Product f g a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Product f g a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> Product f g a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> Product f g a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Product f g a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> Product f g a a0 -> a0 #

toList :: Product f g a a0 -> [a0] #

null :: Product f g a a0 -> Bool #

length :: Product f g a a0 -> Int #

elem :: Eq a0 => a0 -> Product f g a a0 -> Bool #

maximum :: Ord a0 => Product f g a a0 -> a0 #

minimum :: Ord a0 => Product f g a a0 -> a0 #

sum :: Num a0 => Product f g a a0 -> a0 #

product :: Num a0 => Product f g a a0 -> a0 #

(Foldable (f a), Foldable (g a)) => Foldable (Sum f g a) 
Instance details

Defined in Data.Bifunctor.Sum

Methods

fold :: Monoid m => Sum f g a m -> m #

foldMap :: Monoid m => (a0 -> m) -> Sum f g a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> Sum f g a a0 -> m #

foldr :: (a0 -> b -> b) -> b -> Sum f g a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Sum f g a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> Sum f g a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> Sum f g a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Sum f g a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> Sum f g a a0 -> a0 #

toList :: Sum f g a a0 -> [a0] #

null :: Sum f g a a0 -> Bool #

length :: Sum f g a a0 -> Int #

elem :: Eq a0 => a0 -> Sum f g a a0 -> Bool #

maximum :: Ord a0 => Sum f g a a0 -> a0 #

minimum :: Ord a0 => Sum f g a a0 -> a0 #

sum :: Num a0 => Sum f g a a0 -> a0 #

product :: Num a0 => Sum f g a a0 -> a0 #

(Foldable f, Bifoldable p) => Foldable (Tannen f p a) 
Instance details

Defined in Data.Bifunctor.Tannen

Methods

fold :: Monoid m => Tannen f p a m -> m #

foldMap :: Monoid m => (a0 -> m) -> Tannen f p a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> Tannen f p a a0 -> m #

foldr :: (a0 -> b -> b) -> b -> Tannen f p a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Tannen f p a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> Tannen f p a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> Tannen f p a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Tannen f p a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> Tannen f p a a0 -> a0 #

toList :: Tannen f p a a0 -> [a0] #

null :: Tannen f p a a0 -> Bool #

length :: Tannen f p a a0 -> Int #

elem :: Eq a0 => a0 -> Tannen f p a a0 -> Bool #

maximum :: Ord a0 => Tannen f p a a0 -> a0 #

minimum :: Ord a0 => Tannen f p a a0 -> a0 #

sum :: Num a0 => Tannen f p a a0 -> a0 #

product :: Num a0 => Tannen f p a a0 -> a0 #

(Bifoldable p, Foldable g) => Foldable (Biff p f g a) 
Instance details

Defined in Data.Bifunctor.Biff

Methods

fold :: Monoid m => Biff p f g a m -> m #

foldMap :: Monoid m => (a0 -> m) -> Biff p f g a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> Biff p f g a a0 -> m #

foldr :: (a0 -> b -> b) -> b -> Biff p f g a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Biff p f g a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> Biff p f g a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> Biff p f g a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Biff p f g a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> Biff p f g a a0 -> a0 #

toList :: Biff p f g a a0 -> [a0] #

null :: Biff p f g a a0 -> Bool #

length :: Biff p f g a a0 -> Int #

elem :: Eq a0 => a0 -> Biff p f g a a0 -> Bool #

maximum :: Ord a0 => Biff p f g a a0 -> a0 #

minimum :: Ord a0 => Biff p f g a a0 -> a0 #

sum :: Num a0 => Biff p f g a a0 -> a0 #

product :: Num a0 => Biff p f g a a0 -> a0 #

class (Functor t, Foldable t) => Traversable (t :: Type -> Type) where #

Functors representing data structures that can be transformed to structures of the same shape by performing an Applicative (or, therefore, Monad) action on each element from left to right.

A more detailed description of what same shape means, the various methods, how traversals are constructed, and example advanced use-cases can be found in the Overview section of Data.Traversable.

For the class laws see the Laws section of Data.Traversable.

Minimal complete definition

traverse | sequenceA

Methods

traverse :: Applicative f => (a -> f b) -> t a -> f (t b) #

Map each element of a structure to an action, evaluate these actions from left to right, and collect the results. For a version that ignores the results see traverse_.

Examples

Expand

Basic usage:

In the first two examples we show each evaluated action mapping to the output structure.

>>> traverse Just [1,2,3,4]
Just [1,2,3,4]
>>> traverse id [Right 1, Right 2, Right 3, Right 4]
Right [1,2,3,4]

In the next examples, we show that Nothing and Left values short circuit the created structure.

>>> traverse (const Nothing) [1,2,3,4]
Nothing
>>> traverse (\x -> if odd x then Just x else Nothing)  [1,2,3,4]
Nothing
>>> traverse id [Right 1, Right 2, Right 3, Right 4, Left 0]
Left 0

sequenceA :: Applicative f => t (f a) -> f (t a) #

Evaluate each action in the structure from left to right, and collect the results. For a version that ignores the results see sequenceA_.

Examples

Expand

Basic usage:

For the first two examples we show sequenceA fully evaluating a a structure and collecting the results.

>>> sequenceA [Just 1, Just 2, Just 3]
Just [1,2,3]
>>> sequenceA [Right 1, Right 2, Right 3]
Right [1,2,3]

The next two example show Nothing and Just will short circuit the resulting structure if present in the input. For more context, check the Traversable instances for Either and Maybe.

>>> sequenceA [Just 1, Just 2, Just 3, Nothing]
Nothing
>>> sequenceA [Right 1, Right 2, Right 3, Left 4]
Left 4

mapM :: Monad m => (a -> m b) -> t a -> m (t b) #

Map each element of a structure to a monadic action, evaluate these actions from left to right, and collect the results. For a version that ignores the results see mapM_.

Examples

Expand

mapM is literally a traverse with a type signature restricted to Monad. Its implementation may be more efficient due to additional power of Monad.

sequence :: Monad m => t (m a) -> m (t a) #

Evaluate each monadic action in the structure from left to right, and collect the results. For a version that ignores the results see sequence_.

Examples

Expand

Basic usage:

The first two examples are instances where the input and and output of sequence are isomorphic.

>>> sequence $ Right [1,2,3,4]
[Right 1,Right 2,Right 3,Right 4]
>>> sequence $ [Right 1,Right 2,Right 3,Right 4]
Right [1,2,3,4]

The following examples demonstrate short circuit behavior for sequence.

>>> sequence $ Left [1,2,3,4]
Left [1,2,3,4]
>>> sequence $ [Left 0, Right 1,Right 2,Right 3,Right 4]
Left 0

Instances

Instances details
Traversable KeyMap 
Instance details

Defined in Data.Aeson.KeyMap

Methods

traverse :: Applicative f => (a -> f b) -> KeyMap a -> f (KeyMap b) #

sequenceA :: Applicative f => KeyMap (f a) -> f (KeyMap a) #

mapM :: Monad m => (a -> m b) -> KeyMap a -> m (KeyMap b) #

sequence :: Monad m => KeyMap (m a) -> m (KeyMap a) #

Traversable IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

traverse :: Applicative f => (a -> f b) -> IResult a -> f (IResult b) #

sequenceA :: Applicative f => IResult (f a) -> f (IResult a) #

mapM :: Monad m => (a -> m b) -> IResult a -> m (IResult b) #

sequence :: Monad m => IResult (m a) -> m (IResult a) #

Traversable Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

traverse :: Applicative f => (a -> f b) -> Result a -> f (Result b) #

sequenceA :: Applicative f => Result (f a) -> f (Result a) #

mapM :: Monad m => (a -> m b) -> Result a -> m (Result b) #

sequence :: Monad m => Result (m a) -> m (Result a) #

Traversable ZipList

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> ZipList a -> f (ZipList b) #

sequenceA :: Applicative f => ZipList (f a) -> f (ZipList a) #

mapM :: Monad m => (a -> m b) -> ZipList a -> m (ZipList b) #

sequence :: Monad m => ZipList (m a) -> m (ZipList a) #

Traversable Complex

Since: base-4.9.0.0

Instance details

Defined in Data.Complex

Methods

traverse :: Applicative f => (a -> f b) -> Complex a -> f (Complex b) #

sequenceA :: Applicative f => Complex (f a) -> f (Complex a) #

mapM :: Monad m => (a -> m b) -> Complex a -> m (Complex b) #

sequence :: Monad m => Complex (m a) -> m (Complex a) #

Traversable Identity

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Identity a -> f (Identity b) #

sequenceA :: Applicative f => Identity (f a) -> f (Identity a) #

mapM :: Monad m => (a -> m b) -> Identity a -> m (Identity b) #

sequence :: Monad m => Identity (m a) -> m (Identity a) #

Traversable First

Since: base-4.8.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> First a -> f (First b) #

sequenceA :: Applicative f => First (f a) -> f (First a) #

mapM :: Monad m => (a -> m b) -> First a -> m (First b) #

sequence :: Monad m => First (m a) -> m (First a) #

Traversable Last

Since: base-4.8.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Last a -> f (Last b) #

sequenceA :: Applicative f => Last (f a) -> f (Last a) #

mapM :: Monad m => (a -> m b) -> Last a -> m (Last b) #

sequence :: Monad m => Last (m a) -> m (Last a) #

Traversable Down

Since: base-4.12.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Down a -> f (Down b) #

sequenceA :: Applicative f => Down (f a) -> f (Down a) #

mapM :: Monad m => (a -> m b) -> Down a -> m (Down b) #

sequence :: Monad m => Down (m a) -> m (Down a) #

Traversable First

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

traverse :: Applicative f => (a -> f b) -> First a -> f (First b) #

sequenceA :: Applicative f => First (f a) -> f (First a) #

mapM :: Monad m => (a -> m b) -> First a -> m (First b) #

sequence :: Monad m => First (m a) -> m (First a) #

Traversable Last

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

traverse :: Applicative f => (a -> f b) -> Last a -> f (Last b) #

sequenceA :: Applicative f => Last (f a) -> f (Last a) #

mapM :: Monad m => (a -> m b) -> Last a -> m (Last b) #

sequence :: Monad m => Last (m a) -> m (Last a) #

Traversable Max

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

traverse :: Applicative f => (a -> f b) -> Max a -> f (Max b) #

sequenceA :: Applicative f => Max (f a) -> f (Max a) #

mapM :: Monad m => (a -> m b) -> Max a -> m (Max b) #

sequence :: Monad m => Max (m a) -> m (Max a) #

Traversable Min

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

traverse :: Applicative f => (a -> f b) -> Min a -> f (Min b) #

sequenceA :: Applicative f => Min (f a) -> f (Min a) #

mapM :: Monad m => (a -> m b) -> Min a -> m (Min b) #

sequence :: Monad m => Min (m a) -> m (Min a) #

Traversable Dual

Since: base-4.8.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Dual a -> f (Dual b) #

sequenceA :: Applicative f => Dual (f a) -> f (Dual a) #

mapM :: Monad m => (a -> m b) -> Dual a -> m (Dual b) #

sequence :: Monad m => Dual (m a) -> m (Dual a) #

Traversable Product

Since: base-4.8.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Product a -> f (Product b) #

sequenceA :: Applicative f => Product (f a) -> f (Product a) #

mapM :: Monad m => (a -> m b) -> Product a -> m (Product b) #

sequence :: Monad m => Product (m a) -> m (Product a) #

Traversable Sum

Since: base-4.8.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Sum a -> f (Sum b) #

sequenceA :: Applicative f => Sum (f a) -> f (Sum a) #

mapM :: Monad m => (a -> m b) -> Sum a -> m (Sum b) #

sequence :: Monad m => Sum (m a) -> m (Sum a) #

Traversable Par1

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Par1 a -> f (Par1 b) #

sequenceA :: Applicative f => Par1 (f a) -> f (Par1 a) #

mapM :: Monad m => (a -> m b) -> Par1 a -> m (Par1 b) #

sequence :: Monad m => Par1 (m a) -> m (Par1 a) #

Traversable SCC

Since: containers-0.5.9

Instance details

Defined in Data.Graph

Methods

traverse :: Applicative f => (a -> f b) -> SCC a -> f (SCC b) #

sequenceA :: Applicative f => SCC (f a) -> f (SCC a) #

mapM :: Monad m => (a -> m b) -> SCC a -> m (SCC b) #

sequence :: Monad m => SCC (m a) -> m (SCC a) #

Traversable IntMap

Traverses in order of increasing key.

Instance details

Defined in Data.IntMap.Internal

Methods

traverse :: Applicative f => (a -> f b) -> IntMap a -> f (IntMap b) #

sequenceA :: Applicative f => IntMap (f a) -> f (IntMap a) #

mapM :: Monad m => (a -> m b) -> IntMap a -> m (IntMap b) #

sequence :: Monad m => IntMap (m a) -> m (IntMap a) #

Traversable Digit 
Instance details

Defined in Data.Sequence.Internal

Methods

traverse :: Applicative f => (a -> f b) -> Digit a -> f (Digit b) #

sequenceA :: Applicative f => Digit (f a) -> f (Digit a) #

mapM :: Monad m => (a -> m b) -> Digit a -> m (Digit b) #

sequence :: Monad m => Digit (m a) -> m (Digit a) #

Traversable Elem 
Instance details

Defined in Data.Sequence.Internal

Methods

traverse :: Applicative f => (a -> f b) -> Elem a -> f (Elem b) #

sequenceA :: Applicative f => Elem (f a) -> f (Elem a) #

mapM :: Monad m => (a -> m b) -> Elem a -> m (Elem b) #

sequence :: Monad m => Elem (m a) -> m (Elem a) #

Traversable FingerTree 
Instance details

Defined in Data.Sequence.Internal

Methods

traverse :: Applicative f => (a -> f b) -> FingerTree a -> f (FingerTree b) #

sequenceA :: Applicative f => FingerTree (f a) -> f (FingerTree a) #

mapM :: Monad m => (a -> m b) -> FingerTree a -> m (FingerTree b) #

sequence :: Monad m => FingerTree (m a) -> m (FingerTree a) #

Traversable Node 
Instance details

Defined in Data.Sequence.Internal

Methods

traverse :: Applicative f => (a -> f b) -> Node a -> f (Node b) #

sequenceA :: Applicative f => Node (f a) -> f (Node a) #

mapM :: Monad m => (a -> m b) -> Node a -> m (Node b) #

sequence :: Monad m => Node (m a) -> m (Node a) #

Traversable Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

traverse :: Applicative f => (a -> f b) -> Seq a -> f (Seq b) #

sequenceA :: Applicative f => Seq (f a) -> f (Seq a) #

mapM :: Monad m => (a -> m b) -> Seq a -> m (Seq b) #

sequence :: Monad m => Seq (m a) -> m (Seq a) #

Traversable ViewL 
Instance details

Defined in Data.Sequence.Internal

Methods

traverse :: Applicative f => (a -> f b) -> ViewL a -> f (ViewL b) #

sequenceA :: Applicative f => ViewL (f a) -> f (ViewL a) #

mapM :: Monad m => (a -> m b) -> ViewL a -> m (ViewL b) #

sequence :: Monad m => ViewL (m a) -> m (ViewL a) #

Traversable ViewR 
Instance details

Defined in Data.Sequence.Internal

Methods

traverse :: Applicative f => (a -> f b) -> ViewR a -> f (ViewR b) #

sequenceA :: Applicative f => ViewR (f a) -> f (ViewR a) #

mapM :: Monad m => (a -> m b) -> ViewR a -> m (ViewR b) #

sequence :: Monad m => ViewR (m a) -> m (ViewR a) #

Traversable Tree 
Instance details

Defined in Data.Tree

Methods

traverse :: Applicative f => (a -> f b) -> Tree a -> f (Tree b) #

sequenceA :: Applicative f => Tree (f a) -> f (Tree a) #

mapM :: Monad m => (a -> m b) -> Tree a -> m (Tree b) #

sequence :: Monad m => Tree (m a) -> m (Tree a) #

Traversable DList 
Instance details

Defined in Data.DList.Internal

Methods

traverse :: Applicative f => (a -> f b) -> DList a -> f (DList b) #

sequenceA :: Applicative f => DList (f a) -> f (DList a) #

mapM :: Monad m => (a -> m b) -> DList a -> m (DList b) #

sequence :: Monad m => DList (m a) -> m (DList a) #

Traversable HistoriedResponse 
Instance details

Defined in Network.HTTP.Client

Methods

traverse :: Applicative f => (a -> f b) -> HistoriedResponse a -> f (HistoriedResponse b) #

sequenceA :: Applicative f => HistoriedResponse (f a) -> f (HistoriedResponse a) #

mapM :: Monad m => (a -> m b) -> HistoriedResponse a -> m (HistoriedResponse b) #

sequence :: Monad m => HistoriedResponse (m a) -> m (HistoriedResponse a) #

Traversable Response 
Instance details

Defined in Network.HTTP.Client.Types

Methods

traverse :: Applicative f => (a -> f b) -> Response a -> f (Response b) #

sequenceA :: Applicative f => Response (f a) -> f (Response a) #

mapM :: Monad m => (a -> m b) -> Response a -> m (Response b) #

sequence :: Monad m => Response (m a) -> m (Response a) #

Traversable SimpleDocStream

Transform a document based on its annotations, possibly leveraging Applicative effects.

Instance details

Defined in Prettyprinter.Internal

Methods

traverse :: Applicative f => (a -> f b) -> SimpleDocStream a -> f (SimpleDocStream b) #

sequenceA :: Applicative f => SimpleDocStream (f a) -> f (SimpleDocStream a) #

mapM :: Monad m => (a -> m b) -> SimpleDocStream a -> m (SimpleDocStream b) #

sequence :: Monad m => SimpleDocStream (m a) -> m (SimpleDocStream a) #

Traversable Array 
Instance details

Defined in Data.Primitive.Array

Methods

traverse :: Applicative f => (a -> f b) -> Array a -> f (Array b) #

sequenceA :: Applicative f => Array (f a) -> f (Array a) #

mapM :: Monad m => (a -> m b) -> Array a -> m (Array b) #

sequence :: Monad m => Array (m a) -> m (Array a) #

Traversable SmallArray 
Instance details

Defined in Data.Primitive.SmallArray

Methods

traverse :: Applicative f => (a -> f b) -> SmallArray a -> f (SmallArray b) #

sequenceA :: Applicative f => SmallArray (f a) -> f (SmallArray a) #

mapM :: Monad m => (a -> m b) -> SmallArray a -> m (SmallArray b) #

sequence :: Monad m => SmallArray (m a) -> m (SmallArray a) #

Traversable Maybe 
Instance details

Defined in Data.Strict.Maybe

Methods

traverse :: Applicative f => (a -> f b) -> Maybe a -> f (Maybe b) #

sequenceA :: Applicative f => Maybe (f a) -> f (Maybe a) #

mapM :: Monad m => (a -> m b) -> Maybe a -> m (Maybe b) #

sequence :: Monad m => Maybe (m a) -> m (Maybe a) #

Traversable Vector 
Instance details

Defined in Data.Vector

Methods

traverse :: Applicative f => (a -> f b) -> Vector a -> f (Vector b) #

sequenceA :: Applicative f => Vector (f a) -> f (Vector a) #

mapM :: Monad m => (a -> m b) -> Vector a -> m (Vector b) #

sequence :: Monad m => Vector (m a) -> m (Vector a) #

Traversable NonEmpty

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> NonEmpty a -> f (NonEmpty b) #

sequenceA :: Applicative f => NonEmpty (f a) -> f (NonEmpty a) #

mapM :: Monad m => (a -> m b) -> NonEmpty a -> m (NonEmpty b) #

sequence :: Monad m => NonEmpty (m a) -> m (NonEmpty a) #

Traversable Maybe

Since: base-2.1

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Maybe a -> f (Maybe b) #

sequenceA :: Applicative f => Maybe (f a) -> f (Maybe a) #

mapM :: Monad m => (a -> m b) -> Maybe a -> m (Maybe b) #

sequence :: Monad m => Maybe (m a) -> m (Maybe a) #

Traversable Solo

Since: base-4.15

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Solo a -> f (Solo b) #

sequenceA :: Applicative f => Solo (f a) -> f (Solo a) #

mapM :: Monad m => (a -> m b) -> Solo a -> m (Solo b) #

sequence :: Monad m => Solo (m a) -> m (Solo a) #

Traversable []

Since: base-2.1

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> [a] -> f [b] #

sequenceA :: Applicative f => [f a] -> f [a] #

mapM :: Monad m => (a -> m b) -> [a] -> m [b] #

sequence :: Monad m => [m a] -> m [a] #

Traversable (Either a)

Since: base-4.7.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a0 -> f b) -> Either a a0 -> f (Either a b) #

sequenceA :: Applicative f => Either a (f a0) -> f (Either a a0) #

mapM :: Monad m => (a0 -> m b) -> Either a a0 -> m (Either a b) #

sequence :: Monad m => Either a (m a0) -> m (Either a a0) #

Traversable (Proxy :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Proxy a -> f (Proxy b) #

sequenceA :: Applicative f => Proxy (f a) -> f (Proxy a) #

mapM :: Monad m => (a -> m b) -> Proxy a -> m (Proxy b) #

sequence :: Monad m => Proxy (m a) -> m (Proxy a) #

Traversable (Arg a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

traverse :: Applicative f => (a0 -> f b) -> Arg a a0 -> f (Arg a b) #

sequenceA :: Applicative f => Arg a (f a0) -> f (Arg a a0) #

mapM :: Monad m => (a0 -> m b) -> Arg a a0 -> m (Arg a b) #

sequence :: Monad m => Arg a (m a0) -> m (Arg a a0) #

Ix i => Traversable (Array i)

Since: base-2.1

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Array i a -> f (Array i b) #

sequenceA :: Applicative f => Array i (f a) -> f (Array i a) #

mapM :: Monad m => (a -> m b) -> Array i a -> m (Array i b) #

sequence :: Monad m => Array i (m a) -> m (Array i a) #

Traversable (U1 :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> U1 a -> f (U1 b) #

sequenceA :: Applicative f => U1 (f a) -> f (U1 a) #

mapM :: Monad m => (a -> m b) -> U1 a -> m (U1 b) #

sequence :: Monad m => U1 (m a) -> m (U1 a) #

Traversable (UAddr :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> UAddr a -> f (UAddr b) #

sequenceA :: Applicative f => UAddr (f a) -> f (UAddr a) #

mapM :: Monad m => (a -> m b) -> UAddr a -> m (UAddr b) #

sequence :: Monad m => UAddr (m a) -> m (UAddr a) #

Traversable (UChar :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> UChar a -> f (UChar b) #

sequenceA :: Applicative f => UChar (f a) -> f (UChar a) #

mapM :: Monad m => (a -> m b) -> UChar a -> m (UChar b) #

sequence :: Monad m => UChar (m a) -> m (UChar a) #

Traversable (UDouble :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> UDouble a -> f (UDouble b) #

sequenceA :: Applicative f => UDouble (f a) -> f (UDouble a) #

mapM :: Monad m => (a -> m b) -> UDouble a -> m (UDouble b) #

sequence :: Monad m => UDouble (m a) -> m (UDouble a) #

Traversable (UFloat :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> UFloat a -> f (UFloat b) #

sequenceA :: Applicative f => UFloat (f a) -> f (UFloat a) #

mapM :: Monad m => (a -> m b) -> UFloat a -> m (UFloat b) #

sequence :: Monad m => UFloat (m a) -> m (UFloat a) #

Traversable (UInt :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> UInt a -> f (UInt b) #

sequenceA :: Applicative f => UInt (f a) -> f (UInt a) #

mapM :: Monad m => (a -> m b) -> UInt a -> m (UInt b) #

sequence :: Monad m => UInt (m a) -> m (UInt a) #

Traversable (UWord :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> UWord a -> f (UWord b) #

sequenceA :: Applicative f => UWord (f a) -> f (UWord a) #

mapM :: Monad m => (a -> m b) -> UWord a -> m (UWord b) #

sequence :: Monad m => UWord (m a) -> m (UWord a) #

Traversable (V1 :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> V1 a -> f (V1 b) #

sequenceA :: Applicative f => V1 (f a) -> f (V1 a) #

mapM :: Monad m => (a -> m b) -> V1 a -> m (V1 b) #

sequence :: Monad m => V1 (m a) -> m (V1 a) #

Traversable (Map k)

Traverses in order of increasing key.

Instance details

Defined in Data.Map.Internal

Methods

traverse :: Applicative f => (a -> f b) -> Map k a -> f (Map k b) #

sequenceA :: Applicative f => Map k (f a) -> f (Map k a) #

mapM :: Monad m => (a -> m b) -> Map k a -> m (Map k b) #

sequence :: Monad m => Map k (m a) -> m (Map k a) #

Traversable f => Traversable (Cofree f) 
Instance details

Defined in Control.Comonad.Cofree

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Cofree f a -> f0 (Cofree f b) #

sequenceA :: Applicative f0 => Cofree f (f0 a) -> f0 (Cofree f a) #

mapM :: Monad m => (a -> m b) -> Cofree f a -> m (Cofree f b) #

sequence :: Monad m => Cofree f (m a) -> m (Cofree f a) #

Traversable f => Traversable (Free f) 
Instance details

Defined in Control.Monad.Free

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Free f a -> f0 (Free f b) #

sequenceA :: Applicative f0 => Free f (f0 a) -> f0 (Free f a) #

mapM :: Monad m => (a -> m b) -> Free f a -> m (Free f b) #

sequence :: Monad m => Free f (m a) -> m (Free f a) #

Traversable f => Traversable (Yoneda f) 
Instance details

Defined in Data.Functor.Yoneda

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Yoneda f a -> f0 (Yoneda f b) #

sequenceA :: Applicative f0 => Yoneda f (f0 a) -> f0 (Yoneda f a) #

mapM :: Monad m => (a -> m b) -> Yoneda f a -> m (Yoneda f b) #

sequence :: Monad m => Yoneda f (m a) -> m (Yoneda f a) #

Traversable (Either e) 
Instance details

Defined in Data.Strict.Either

Methods

traverse :: Applicative f => (a -> f b) -> Either e a -> f (Either e b) #

sequenceA :: Applicative f => Either e (f a) -> f (Either e a) #

mapM :: Monad m => (a -> m b) -> Either e a -> m (Either e b) #

sequence :: Monad m => Either e (m a) -> m (Either e a) #

Traversable (These a) 
Instance details

Defined in Data.Strict.These

Methods

traverse :: Applicative f => (a0 -> f b) -> These a a0 -> f (These a b) #

sequenceA :: Applicative f => These a (f a0) -> f (These a a0) #

mapM :: Monad m => (a0 -> m b) -> These a a0 -> m (These a b) #

sequence :: Monad m => These a (m a0) -> m (These a a0) #

Traversable (Pair e) 
Instance details

Defined in Data.Strict.Tuple

Methods

traverse :: Applicative f => (a -> f b) -> Pair e a -> f (Pair e b) #

sequenceA :: Applicative f => Pair e (f a) -> f (Pair e a) #

mapM :: Monad m => (a -> m b) -> Pair e a -> m (Pair e b) #

sequence :: Monad m => Pair e (m a) -> m (Pair e a) #

Traversable (These a) 
Instance details

Defined in Data.These

Methods

traverse :: Applicative f => (a0 -> f b) -> These a a0 -> f (These a b) #

sequenceA :: Applicative f => These a (f a0) -> f (These a a0) #

mapM :: Monad m => (a0 -> m b) -> These a a0 -> m (These a b) #

sequence :: Monad m => These a (m a0) -> m (These a a0) #

Traversable f => Traversable (Lift f) 
Instance details

Defined in Control.Applicative.Lift

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Lift f a -> f0 (Lift f b) #

sequenceA :: Applicative f0 => Lift f (f0 a) -> f0 (Lift f a) #

mapM :: Monad m => (a -> m b) -> Lift f a -> m (Lift f b) #

sequence :: Monad m => Lift f (m a) -> m (Lift f a) #

Traversable f => Traversable (ListT f) 
Instance details

Defined in Control.Monad.Trans.List

Methods

traverse :: Applicative f0 => (a -> f0 b) -> ListT f a -> f0 (ListT f b) #

sequenceA :: Applicative f0 => ListT f (f0 a) -> f0 (ListT f a) #

mapM :: Monad m => (a -> m b) -> ListT f a -> m (ListT f b) #

sequence :: Monad m => ListT f (m a) -> m (ListT f a) #

Traversable f => Traversable (MaybeT f) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

traverse :: Applicative f0 => (a -> f0 b) -> MaybeT f a -> f0 (MaybeT f b) #

sequenceA :: Applicative f0 => MaybeT f (f0 a) -> f0 (MaybeT f a) #

mapM :: Monad m => (a -> m b) -> MaybeT f a -> m (MaybeT f b) #

sequence :: Monad m => MaybeT f (m a) -> m (MaybeT f a) #

Traversable (HashMap k) 
Instance details

Defined in Data.HashMap.Internal

Methods

traverse :: Applicative f => (a -> f b) -> HashMap k a -> f (HashMap k b) #

sequenceA :: Applicative f => HashMap k (f a) -> f (HashMap k a) #

mapM :: Monad m => (a -> m b) -> HashMap k a -> m (HashMap k b) #

sequence :: Monad m => HashMap k (m a) -> m (HashMap k a) #

Traversable ((,) a)

Since: base-4.7.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a0 -> f b) -> (a, a0) -> f (a, b) #

sequenceA :: Applicative f => (a, f a0) -> f (a, a0) #

mapM :: Monad m => (a0 -> m b) -> (a, a0) -> m (a, b) #

sequence :: Monad m => (a, m a0) -> m (a, a0) #

Traversable (Const m :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Const m a -> f (Const m b) #

sequenceA :: Applicative f => Const m (f a) -> f (Const m a) #

mapM :: Monad m0 => (a -> m0 b) -> Const m a -> m0 (Const m b) #

sequence :: Monad m0 => Const m (m0 a) -> m0 (Const m a) #

Traversable f => Traversable (Ap f)

Since: base-4.12.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Ap f a -> f0 (Ap f b) #

sequenceA :: Applicative f0 => Ap f (f0 a) -> f0 (Ap f a) #

mapM :: Monad m => (a -> m b) -> Ap f a -> m (Ap f b) #

sequence :: Monad m => Ap f (m a) -> m (Ap f a) #

Traversable f => Traversable (Alt f)

Since: base-4.12.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Alt f a -> f0 (Alt f b) #

sequenceA :: Applicative f0 => Alt f (f0 a) -> f0 (Alt f a) #

mapM :: Monad m => (a -> m b) -> Alt f a -> m (Alt f b) #

sequence :: Monad m => Alt f (m a) -> m (Alt f a) #

Traversable f => Traversable (Rec1 f)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Rec1 f a -> f0 (Rec1 f b) #

sequenceA :: Applicative f0 => Rec1 f (f0 a) -> f0 (Rec1 f a) #

mapM :: Monad m => (a -> m b) -> Rec1 f a -> m (Rec1 f b) #

sequence :: Monad m => Rec1 f (m a) -> m (Rec1 f a) #

Bitraversable p => Traversable (Fix p) 
Instance details

Defined in Data.Bifunctor.Fix

Methods

traverse :: Applicative f => (a -> f b) -> Fix p a -> f (Fix p b) #

sequenceA :: Applicative f => Fix p (f a) -> f (Fix p a) #

mapM :: Monad m => (a -> m b) -> Fix p a -> m (Fix p b) #

sequence :: Monad m => Fix p (m a) -> m (Fix p a) #

Bitraversable p => Traversable (Join p) 
Instance details

Defined in Data.Bifunctor.Join

Methods

traverse :: Applicative f => (a -> f b) -> Join p a -> f (Join p b) #

sequenceA :: Applicative f => Join p (f a) -> f (Join p a) #

mapM :: Monad m => (a -> m b) -> Join p a -> m (Join p b) #

sequence :: Monad m => Join p (m a) -> m (Join p a) #

Traversable f => Traversable (CofreeF f a) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

traverse :: Applicative f0 => (a0 -> f0 b) -> CofreeF f a a0 -> f0 (CofreeF f a b) #

sequenceA :: Applicative f0 => CofreeF f a (f0 a0) -> f0 (CofreeF f a a0) #

mapM :: Monad m => (a0 -> m b) -> CofreeF f a a0 -> m (CofreeF f a b) #

sequence :: Monad m => CofreeF f a (m a0) -> m (CofreeF f a a0) #

(Traversable f, Traversable w) => Traversable (CofreeT f w) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

traverse :: Applicative f0 => (a -> f0 b) -> CofreeT f w a -> f0 (CofreeT f w b) #

sequenceA :: Applicative f0 => CofreeT f w (f0 a) -> f0 (CofreeT f w a) #

mapM :: Monad m => (a -> m b) -> CofreeT f w a -> m (CofreeT f w b) #

sequence :: Monad m => CofreeT f w (m a) -> m (CofreeT f w a) #

Traversable f => Traversable (FreeF f a) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

traverse :: Applicative f0 => (a0 -> f0 b) -> FreeF f a a0 -> f0 (FreeF f a b) #

sequenceA :: Applicative f0 => FreeF f a (f0 a0) -> f0 (FreeF f a a0) #

mapM :: Monad m => (a0 -> m b) -> FreeF f a a0 -> m (FreeF f a b) #

sequence :: Monad m => FreeF f a (m a0) -> m (FreeF f a a0) #

(Monad m, Traversable m, Traversable f) => Traversable (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

traverse :: Applicative f0 => (a -> f0 b) -> FreeT f m a -> f0 (FreeT f m b) #

sequenceA :: Applicative f0 => FreeT f m (f0 a) -> f0 (FreeT f m a) #

mapM :: Monad m0 => (a -> m0 b) -> FreeT f m a -> m0 (FreeT f m b) #

sequence :: Monad m0 => FreeT f m (m0 a) -> m0 (FreeT f m a) #

Traversable (Tagged s) 
Instance details

Defined in Data.Tagged

Methods

traverse :: Applicative f => (a -> f b) -> Tagged s a -> f (Tagged s b) #

sequenceA :: Applicative f => Tagged s (f a) -> f (Tagged s a) #

mapM :: Monad m => (a -> m b) -> Tagged s a -> m (Tagged s b) #

sequence :: Monad m => Tagged s (m a) -> m (Tagged s a) #

(Traversable f, Traversable g) => Traversable (These1 f g) 
Instance details

Defined in Data.Functor.These

Methods

traverse :: Applicative f0 => (a -> f0 b) -> These1 f g a -> f0 (These1 f g b) #

sequenceA :: Applicative f0 => These1 f g (f0 a) -> f0 (These1 f g a) #

mapM :: Monad m => (a -> m b) -> These1 f g a -> m (These1 f g b) #

sequence :: Monad m => These1 f g (m a) -> m (These1 f g a) #

Traversable f => Traversable (Backwards f)

Derived instance.

Instance details

Defined in Control.Applicative.Backwards

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Backwards f a -> f0 (Backwards f b) #

sequenceA :: Applicative f0 => Backwards f (f0 a) -> f0 (Backwards f a) #

mapM :: Monad m => (a -> m b) -> Backwards f a -> m (Backwards f b) #

sequence :: Monad m => Backwards f (m a) -> m (Backwards f a) #

Traversable f => Traversable (ErrorT e f) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

traverse :: Applicative f0 => (a -> f0 b) -> ErrorT e f a -> f0 (ErrorT e f b) #

sequenceA :: Applicative f0 => ErrorT e f (f0 a) -> f0 (ErrorT e f a) #

mapM :: Monad m => (a -> m b) -> ErrorT e f a -> m (ErrorT e f b) #

sequence :: Monad m => ErrorT e f (m a) -> m (ErrorT e f a) #

Traversable f => Traversable (ExceptT e f) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

traverse :: Applicative f0 => (a -> f0 b) -> ExceptT e f a -> f0 (ExceptT e f b) #

sequenceA :: Applicative f0 => ExceptT e f (f0 a) -> f0 (ExceptT e f a) #

mapM :: Monad m => (a -> m b) -> ExceptT e f a -> m (ExceptT e f b) #

sequence :: Monad m => ExceptT e f (m a) -> m (ExceptT e f a) #

Traversable f => Traversable (IdentityT f) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

traverse :: Applicative f0 => (a -> f0 b) -> IdentityT f a -> f0 (IdentityT f b) #

sequenceA :: Applicative f0 => IdentityT f (f0 a) -> f0 (IdentityT f a) #

mapM :: Monad m => (a -> m b) -> IdentityT f a -> m (IdentityT f b) #

sequence :: Monad m => IdentityT f (m a) -> m (IdentityT f a) #

Traversable f => Traversable (WriterT w f) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

traverse :: Applicative f0 => (a -> f0 b) -> WriterT w f a -> f0 (WriterT w f b) #

sequenceA :: Applicative f0 => WriterT w f (f0 a) -> f0 (WriterT w f a) #

mapM :: Monad m => (a -> m b) -> WriterT w f a -> m (WriterT w f b) #

sequence :: Monad m => WriterT w f (m a) -> m (WriterT w f a) #

Traversable f => Traversable (WriterT w f) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

traverse :: Applicative f0 => (a -> f0 b) -> WriterT w f a -> f0 (WriterT w f b) #

sequenceA :: Applicative f0 => WriterT w f (f0 a) -> f0 (WriterT w f a) #

mapM :: Monad m => (a -> m b) -> WriterT w f a -> m (WriterT w f b) #

sequence :: Monad m => WriterT w f (m a) -> m (WriterT w f a) #

Traversable (Constant a :: Type -> Type) 
Instance details

Defined in Data.Functor.Constant

Methods

traverse :: Applicative f => (a0 -> f b) -> Constant a a0 -> f (Constant a b) #

sequenceA :: Applicative f => Constant a (f a0) -> f (Constant a a0) #

mapM :: Monad m => (a0 -> m b) -> Constant a a0 -> m (Constant a b) #

sequence :: Monad m => Constant a (m a0) -> m (Constant a a0) #

Traversable f => Traversable (Reverse f)

Traverse from right to left.

Instance details

Defined in Data.Functor.Reverse

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Reverse f a -> f0 (Reverse f b) #

sequenceA :: Applicative f0 => Reverse f (f0 a) -> f0 (Reverse f a) #

mapM :: Monad m => (a -> m b) -> Reverse f a -> m (Reverse f b) #

sequence :: Monad m => Reverse f (m a) -> m (Reverse f a) #

(Traversable f, Traversable g) => Traversable (Product f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Product

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Product f g a -> f0 (Product f g b) #

sequenceA :: Applicative f0 => Product f g (f0 a) -> f0 (Product f g a) #

mapM :: Monad m => (a -> m b) -> Product f g a -> m (Product f g b) #

sequence :: Monad m => Product f g (m a) -> m (Product f g a) #

(Traversable f, Traversable g) => Traversable (Sum f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Sum

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Sum f g a -> f0 (Sum f g b) #

sequenceA :: Applicative f0 => Sum f g (f0 a) -> f0 (Sum f g a) #

mapM :: Monad m => (a -> m b) -> Sum f g a -> m (Sum f g b) #

sequence :: Monad m => Sum f g (m a) -> m (Sum f g a) #

(Traversable f, Traversable g) => Traversable (f :*: g)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f0 => (a -> f0 b) -> (f :*: g) a -> f0 ((f :*: g) b) #

sequenceA :: Applicative f0 => (f :*: g) (f0 a) -> f0 ((f :*: g) a) #

mapM :: Monad m => (a -> m b) -> (f :*: g) a -> m ((f :*: g) b) #

sequence :: Monad m => (f :*: g) (m a) -> m ((f :*: g) a) #

(Traversable f, Traversable g) => Traversable (f :+: g)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f0 => (a -> f0 b) -> (f :+: g) a -> f0 ((f :+: g) b) #

sequenceA :: Applicative f0 => (f :+: g) (f0 a) -> f0 ((f :+: g) a) #

mapM :: Monad m => (a -> m b) -> (f :+: g) a -> m ((f :+: g) b) #

sequence :: Monad m => (f :+: g) (m a) -> m ((f :+: g) a) #

Traversable (K1 i c :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> K1 i c a -> f (K1 i c b) #

sequenceA :: Applicative f => K1 i c (f a) -> f (K1 i c a) #

mapM :: Monad m => (a -> m b) -> K1 i c a -> m (K1 i c b) #

sequence :: Monad m => K1 i c (m a) -> m (K1 i c a) #

(Traversable f, Traversable g) => Traversable (Compose f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Compose f g a -> f0 (Compose f g b) #

sequenceA :: Applicative f0 => Compose f g (f0 a) -> f0 (Compose f g a) #

mapM :: Monad m => (a -> m b) -> Compose f g a -> m (Compose f g b) #

sequence :: Monad m => Compose f g (m a) -> m (Compose f g a) #

(Traversable f, Traversable g) => Traversable (f :.: g)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f0 => (a -> f0 b) -> (f :.: g) a -> f0 ((f :.: g) b) #

sequenceA :: Applicative f0 => (f :.: g) (f0 a) -> f0 ((f :.: g) a) #

mapM :: Monad m => (a -> m b) -> (f :.: g) a -> m ((f :.: g) b) #

sequence :: Monad m => (f :.: g) (m a) -> m ((f :.: g) a) #

Traversable f => Traversable (M1 i c f)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f0 => (a -> f0 b) -> M1 i c f a -> f0 (M1 i c f b) #

sequenceA :: Applicative f0 => M1 i c f (f0 a) -> f0 (M1 i c f a) #

mapM :: Monad m => (a -> m b) -> M1 i c f a -> m (M1 i c f b) #

sequence :: Monad m => M1 i c f (m a) -> m (M1 i c f a) #

Traversable (Clown f a :: Type -> Type) 
Instance details

Defined in Data.Bifunctor.Clown

Methods

traverse :: Applicative f0 => (a0 -> f0 b) -> Clown f a a0 -> f0 (Clown f a b) #

sequenceA :: Applicative f0 => Clown f a (f0 a0) -> f0 (Clown f a a0) #

mapM :: Monad m => (a0 -> m b) -> Clown f a a0 -> m (Clown f a b) #

sequence :: Monad m => Clown f a (m a0) -> m (Clown f a a0) #

Bitraversable p => Traversable (Flip p a) 
Instance details

Defined in Data.Bifunctor.Flip

Methods

traverse :: Applicative f => (a0 -> f b) -> Flip p a a0 -> f (Flip p a b) #

sequenceA :: Applicative f => Flip p a (f a0) -> f (Flip p a a0) #

mapM :: Monad m => (a0 -> m b) -> Flip p a a0 -> m (Flip p a b) #

sequence :: Monad m => Flip p a (m a0) -> m (Flip p a a0) #

Traversable g => Traversable (Joker g a) 
Instance details

Defined in Data.Bifunctor.Joker

Methods

traverse :: Applicative f => (a0 -> f b) -> Joker g a a0 -> f (Joker g a b) #

sequenceA :: Applicative f => Joker g a (f a0) -> f (Joker g a a0) #

mapM :: Monad m => (a0 -> m b) -> Joker g a a0 -> m (Joker g a b) #

sequence :: Monad m => Joker g a (m a0) -> m (Joker g a a0) #

Bitraversable p => Traversable (WrappedBifunctor p a) 
Instance details

Defined in Data.Bifunctor.Wrapped

Methods

traverse :: Applicative f => (a0 -> f b) -> WrappedBifunctor p a a0 -> f (WrappedBifunctor p a b) #

sequenceA :: Applicative f => WrappedBifunctor p a (f a0) -> f (WrappedBifunctor p a a0) #

mapM :: Monad m => (a0 -> m b) -> WrappedBifunctor p a a0 -> m (WrappedBifunctor p a b) #

sequence :: Monad m => WrappedBifunctor p a (m a0) -> m (WrappedBifunctor p a a0) #

(Traversable (f a), Traversable (g a)) => Traversable (Product f g a) 
Instance details

Defined in Data.Bifunctor.Product

Methods

traverse :: Applicative f0 => (a0 -> f0 b) -> Product f g a a0 -> f0 (Product f g a b) #

sequenceA :: Applicative f0 => Product f g a (f0 a0) -> f0 (Product f g a a0) #

mapM :: Monad m => (a0 -> m b) -> Product f g a a0 -> m (Product f g a b) #

sequence :: Monad m => Product f g a (m a0) -> m (Product f g a a0) #

(Traversable (f a), Traversable (g a)) => Traversable (Sum f g a) 
Instance details

Defined in Data.Bifunctor.Sum

Methods

traverse :: Applicative f0 => (a0 -> f0 b) -> Sum f g a a0 -> f0 (Sum f g a b) #

sequenceA :: Applicative f0 => Sum f g a (f0 a0) -> f0 (Sum f g a a0) #

mapM :: Monad m => (a0 -> m b) -> Sum f g a a0 -> m (Sum f g a b) #

sequence :: Monad m => Sum f g a (m a0) -> m (Sum f g a a0) #

(Traversable f, Bitraversable p) => Traversable (Tannen f p a) 
Instance details

Defined in Data.Bifunctor.Tannen

Methods

traverse :: Applicative f0 => (a0 -> f0 b) -> Tannen f p a a0 -> f0 (Tannen f p a b) #

sequenceA :: Applicative f0 => Tannen f p a (f0 a0) -> f0 (Tannen f p a a0) #

mapM :: Monad m => (a0 -> m b) -> Tannen f p a a0 -> m (Tannen f p a b) #

sequence :: Monad m => Tannen f p a (m a0) -> m (Tannen f p a a0) #

(Bitraversable p, Traversable g) => Traversable (Biff p f g a) 
Instance details

Defined in Data.Bifunctor.Biff

Methods

traverse :: Applicative f0 => (a0 -> f0 b) -> Biff p f g a a0 -> f0 (Biff p f g a b) #

sequenceA :: Applicative f0 => Biff p f g a (f0 a0) -> f0 (Biff p f g a a0) #

mapM :: Monad m => (a0 -> m b) -> Biff p f g a a0 -> m (Biff p f g a b) #

sequence :: Monad m => Biff p f g a (m a0) -> m (Biff p f g a a0) #

class Generic a #

Representable types of kind *. This class is derivable in GHC with the DeriveGeneric flag on.

A Generic instance must satisfy the following laws:

from . toid
to . fromid

Minimal complete definition

from, to

Instances

Instances details
Generic Value 
Instance details

Defined in Data.Aeson.Types.Internal

Associated Types

type Rep Value :: Type -> Type #

Methods

from :: Value -> Rep Value x #

to :: Rep Value x -> Value #

Generic ConfigProfile 
Instance details

Defined in Amazonka.Auth.ConfigFile

Associated Types

type Rep ConfigProfile :: Type -> Type #

Generic CredentialSource 
Instance details

Defined in Amazonka.Auth.ConfigFile

Associated Types

type Rep CredentialSource :: Type -> Type #

Generic AuthError 
Instance details

Defined in Amazonka.Auth.Exception

Associated Types

type Rep AuthError :: Type -> Type #

Generic CachedAccessToken 
Instance details

Defined in Amazonka.Auth.SSO

Associated Types

type Rep CachedAccessToken :: Type -> Type #

Generic Autoscaling 
Instance details

Defined in Amazonka.EC2.Metadata

Associated Types

type Rep Autoscaling :: Type -> Type #

Generic Dynamic 
Instance details

Defined in Amazonka.EC2.Metadata

Associated Types

type Rep Dynamic :: Type -> Type #

Methods

from :: Dynamic -> Rep Dynamic x #

to :: Rep Dynamic x -> Dynamic #

Generic ElasticGpus 
Instance details

Defined in Amazonka.EC2.Metadata

Associated Types

type Rep ElasticGpus :: Type -> Type #

Generic ElasticInference 
Instance details

Defined in Amazonka.EC2.Metadata

Associated Types

type Rep ElasticInference :: Type -> Type #

Generic Events 
Instance details

Defined in Amazonka.EC2.Metadata

Associated Types

type Rep Events :: Type -> Type #

Methods

from :: Events -> Rep Events x #

to :: Rep Events x -> Events #

Generic IAM 
Instance details

Defined in Amazonka.EC2.Metadata

Associated Types

type Rep IAM :: Type -> Type #

Methods

from :: IAM -> Rep IAM x #

to :: Rep IAM x -> IAM #

Generic IdentityCredentialsEC2 
Instance details

Defined in Amazonka.EC2.Metadata

Associated Types

type Rep IdentityCredentialsEC2 :: Type -> Type #

Generic IdentityDocument 
Instance details

Defined in Amazonka.EC2.Metadata

Associated Types

type Rep IdentityDocument :: Type -> Type #

Generic Interface 
Instance details

Defined in Amazonka.EC2.Metadata

Associated Types

type Rep Interface :: Type -> Type #

Generic Maintenance 
Instance details

Defined in Amazonka.EC2.Metadata

Associated Types

type Rep Maintenance :: Type -> Type #

Generic Mapping 
Instance details

Defined in Amazonka.EC2.Metadata

Associated Types

type Rep Mapping :: Type -> Type #

Methods

from :: Mapping -> Rep Mapping x #

to :: Rep Mapping x -> Mapping #

Generic Metadata 
Instance details

Defined in Amazonka.EC2.Metadata

Associated Types

type Rep Metadata :: Type -> Type #

Methods

from :: Metadata -> Rep Metadata x #

to :: Rep Metadata x -> Metadata #

Generic Placement 
Instance details

Defined in Amazonka.EC2.Metadata

Associated Types

type Rep Placement :: Type -> Type #

Generic Recommendations 
Instance details

Defined in Amazonka.EC2.Metadata

Associated Types

type Rep Recommendations :: Type -> Type #

Generic Services 
Instance details

Defined in Amazonka.EC2.Metadata

Associated Types

type Rep Services :: Type -> Type #

Methods

from :: Services -> Rep Services x #

to :: Rep Services x -> Services #

Generic Spot 
Instance details

Defined in Amazonka.EC2.Metadata

Associated Types

type Rep Spot :: Type -> Type #

Methods

from :: Spot -> Rep Spot x #

to :: Rep Spot x -> Spot #

Generic Tags 
Instance details

Defined in Amazonka.EC2.Metadata

Associated Types

type Rep Tags :: Type -> Type #

Methods

from :: Tags -> Rep Tags x #

to :: Rep Tags x -> Tags #

Generic Finality 
Instance details

Defined in Amazonka.Env.Hooks

Associated Types

type Rep Finality :: Type -> Type #

Methods

from :: Finality -> Rep Finality x #

to :: Rep Finality x -> Finality #

Generic LogLevel 
Instance details

Defined in Amazonka.Logger

Associated Types

type Rep LogLevel :: Type -> Type #

Methods

from :: LogLevel -> Rep LogLevel x #

to :: Rep LogLevel x -> LogLevel #

Generic ActivateType 
Instance details

Defined in Amazonka.CloudFormation.ActivateType

Associated Types

type Rep ActivateType :: Type -> Type #

Generic ActivateTypeResponse 
Instance details

Defined in Amazonka.CloudFormation.ActivateType

Associated Types

type Rep ActivateTypeResponse :: Type -> Type #

Generic BatchDescribeTypeConfigurations 
Instance details

Defined in Amazonka.CloudFormation.BatchDescribeTypeConfigurations

Associated Types

type Rep BatchDescribeTypeConfigurations :: Type -> Type #

Generic BatchDescribeTypeConfigurationsResponse 
Instance details

Defined in Amazonka.CloudFormation.BatchDescribeTypeConfigurations

Generic CancelUpdateStack 
Instance details

Defined in Amazonka.CloudFormation.CancelUpdateStack

Associated Types

type Rep CancelUpdateStack :: Type -> Type #

Generic CancelUpdateStackResponse 
Instance details

Defined in Amazonka.CloudFormation.CancelUpdateStack

Associated Types

type Rep CancelUpdateStackResponse :: Type -> Type #

Generic ContinueUpdateRollback 
Instance details

Defined in Amazonka.CloudFormation.ContinueUpdateRollback

Associated Types

type Rep ContinueUpdateRollback :: Type -> Type #

Generic ContinueUpdateRollbackResponse 
Instance details

Defined in Amazonka.CloudFormation.ContinueUpdateRollback

Associated Types

type Rep ContinueUpdateRollbackResponse :: Type -> Type #

Generic CreateChangeSet 
Instance details

Defined in Amazonka.CloudFormation.CreateChangeSet

Associated Types

type Rep CreateChangeSet :: Type -> Type #

Generic CreateChangeSetResponse 
Instance details

Defined in Amazonka.CloudFormation.CreateChangeSet

Associated Types

type Rep CreateChangeSetResponse :: Type -> Type #

Generic CreateStack 
Instance details

Defined in Amazonka.CloudFormation.CreateStack

Associated Types

type Rep CreateStack :: Type -> Type #

Generic CreateStackResponse 
Instance details

Defined in Amazonka.CloudFormation.CreateStack

Associated Types

type Rep CreateStackResponse :: Type -> Type #

Generic CreateStackInstances 
Instance details

Defined in Amazonka.CloudFormation.CreateStackInstances

Associated Types

type Rep CreateStackInstances :: Type -> Type #

Generic CreateStackInstancesResponse 
Instance details

Defined in Amazonka.CloudFormation.CreateStackInstances

Associated Types

type Rep CreateStackInstancesResponse :: Type -> Type #

Generic CreateStackSet 
Instance details

Defined in Amazonka.CloudFormation.CreateStackSet

Associated Types

type Rep CreateStackSet :: Type -> Type #

Generic CreateStackSetResponse 
Instance details

Defined in Amazonka.CloudFormation.CreateStackSet

Associated Types

type Rep CreateStackSetResponse :: Type -> Type #

Generic DeactivateType 
Instance details

Defined in Amazonka.CloudFormation.DeactivateType

Associated Types

type Rep DeactivateType :: Type -> Type #

Generic DeactivateTypeResponse 
Instance details

Defined in Amazonka.CloudFormation.DeactivateType

Associated Types

type Rep DeactivateTypeResponse :: Type -> Type #

Generic DeleteChangeSet 
Instance details

Defined in Amazonka.CloudFormation.DeleteChangeSet

Associated Types

type Rep DeleteChangeSet :: Type -> Type #

Generic DeleteChangeSetResponse 
Instance details

Defined in Amazonka.CloudFormation.DeleteChangeSet

Associated Types

type Rep DeleteChangeSetResponse :: Type -> Type #

Generic DeleteStack 
Instance details

Defined in Amazonka.CloudFormation.DeleteStack

Associated Types

type Rep DeleteStack :: Type -> Type #

Generic DeleteStackResponse 
Instance details

Defined in Amazonka.CloudFormation.DeleteStack

Associated Types

type Rep DeleteStackResponse :: Type -> Type #

Generic DeleteStackInstances 
Instance details

Defined in Amazonka.CloudFormation.DeleteStackInstances

Associated Types

type Rep DeleteStackInstances :: Type -> Type #

Generic DeleteStackInstancesResponse 
Instance details

Defined in Amazonka.CloudFormation.DeleteStackInstances

Associated Types

type Rep DeleteStackInstancesResponse :: Type -> Type #

Generic DeleteStackSet 
Instance details

Defined in Amazonka.CloudFormation.DeleteStackSet

Associated Types

type Rep DeleteStackSet :: Type -> Type #

Generic DeleteStackSetResponse 
Instance details

Defined in Amazonka.CloudFormation.DeleteStackSet

Associated Types

type Rep DeleteStackSetResponse :: Type -> Type #

Generic DeregisterType 
Instance details

Defined in Amazonka.CloudFormation.DeregisterType

Associated Types

type Rep DeregisterType :: Type -> Type #

Generic DeregisterTypeResponse 
Instance details

Defined in Amazonka.CloudFormation.DeregisterType

Associated Types

type Rep DeregisterTypeResponse :: Type -> Type #

Generic DescribeAccountLimits 
Instance details

Defined in Amazonka.CloudFormation.DescribeAccountLimits

Associated Types

type Rep DescribeAccountLimits :: Type -> Type #

Generic DescribeAccountLimitsResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeAccountLimits

Associated Types

type Rep DescribeAccountLimitsResponse :: Type -> Type #

Generic DescribeChangeSet 
Instance details

Defined in Amazonka.CloudFormation.DescribeChangeSet

Associated Types

type Rep DescribeChangeSet :: Type -> Type #

Generic DescribeChangeSetResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeChangeSet

Associated Types

type Rep DescribeChangeSetResponse :: Type -> Type #

Generic DescribeChangeSetHooks 
Instance details

Defined in Amazonka.CloudFormation.DescribeChangeSetHooks

Associated Types

type Rep DescribeChangeSetHooks :: Type -> Type #

Generic DescribeChangeSetHooksResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeChangeSetHooks

Associated Types

type Rep DescribeChangeSetHooksResponse :: Type -> Type #

Generic DescribePublisher 
Instance details

Defined in Amazonka.CloudFormation.DescribePublisher

Associated Types

type Rep DescribePublisher :: Type -> Type #

Generic DescribePublisherResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribePublisher

Associated Types

type Rep DescribePublisherResponse :: Type -> Type #

Generic DescribeStackDriftDetectionStatus 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackDriftDetectionStatus

Associated Types

type Rep DescribeStackDriftDetectionStatus :: Type -> Type #

Generic DescribeStackDriftDetectionStatusResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackDriftDetectionStatus

Generic DescribeStackEvents 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackEvents

Associated Types

type Rep DescribeStackEvents :: Type -> Type #

Generic DescribeStackEventsResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackEvents

Associated Types

type Rep DescribeStackEventsResponse :: Type -> Type #

Generic DescribeStackInstance 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackInstance

Associated Types

type Rep DescribeStackInstance :: Type -> Type #

Generic DescribeStackInstanceResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackInstance

Associated Types

type Rep DescribeStackInstanceResponse :: Type -> Type #

Generic DescribeStackResource 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackResource

Associated Types

type Rep DescribeStackResource :: Type -> Type #

Generic DescribeStackResourceResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackResource

Associated Types

type Rep DescribeStackResourceResponse :: Type -> Type #

Generic DescribeStackResourceDrifts 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackResourceDrifts

Associated Types

type Rep DescribeStackResourceDrifts :: Type -> Type #

Generic DescribeStackResourceDriftsResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackResourceDrifts

Generic DescribeStackResources 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackResources

Associated Types

type Rep DescribeStackResources :: Type -> Type #

Generic DescribeStackResourcesResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackResources

Associated Types

type Rep DescribeStackResourcesResponse :: Type -> Type #

Generic DescribeStackSet 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackSet

Associated Types

type Rep DescribeStackSet :: Type -> Type #

Generic DescribeStackSetResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackSet

Associated Types

type Rep DescribeStackSetResponse :: Type -> Type #

Generic DescribeStackSetOperation 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackSetOperation

Associated Types

type Rep DescribeStackSetOperation :: Type -> Type #

Generic DescribeStackSetOperationResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackSetOperation

Associated Types

type Rep DescribeStackSetOperationResponse :: Type -> Type #

Generic DescribeStacks 
Instance details

Defined in Amazonka.CloudFormation.DescribeStacks

Associated Types

type Rep DescribeStacks :: Type -> Type #

Generic DescribeStacksResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStacks

Associated Types

type Rep DescribeStacksResponse :: Type -> Type #

Generic DescribeType 
Instance details

Defined in Amazonka.CloudFormation.DescribeType

Associated Types

type Rep DescribeType :: Type -> Type #

Generic DescribeTypeResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeType

Associated Types

type Rep DescribeTypeResponse :: Type -> Type #

Generic DescribeTypeRegistration 
Instance details

Defined in Amazonka.CloudFormation.DescribeTypeRegistration

Associated Types

type Rep DescribeTypeRegistration :: Type -> Type #

Generic DescribeTypeRegistrationResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeTypeRegistration

Associated Types

type Rep DescribeTypeRegistrationResponse :: Type -> Type #

Generic DetectStackDrift 
Instance details

Defined in Amazonka.CloudFormation.DetectStackDrift

Associated Types

type Rep DetectStackDrift :: Type -> Type #

Generic DetectStackDriftResponse 
Instance details

Defined in Amazonka.CloudFormation.DetectStackDrift

Associated Types

type Rep DetectStackDriftResponse :: Type -> Type #

Generic DetectStackResourceDrift 
Instance details

Defined in Amazonka.CloudFormation.DetectStackResourceDrift

Associated Types

type Rep DetectStackResourceDrift :: Type -> Type #

Generic DetectStackResourceDriftResponse 
Instance details

Defined in Amazonka.CloudFormation.DetectStackResourceDrift

Associated Types

type Rep DetectStackResourceDriftResponse :: Type -> Type #

Generic DetectStackSetDrift 
Instance details

Defined in Amazonka.CloudFormation.DetectStackSetDrift

Associated Types

type Rep DetectStackSetDrift :: Type -> Type #

Generic DetectStackSetDriftResponse 
Instance details

Defined in Amazonka.CloudFormation.DetectStackSetDrift

Associated Types

type Rep DetectStackSetDriftResponse :: Type -> Type #

Generic EstimateTemplateCost 
Instance details

Defined in Amazonka.CloudFormation.EstimateTemplateCost

Associated Types

type Rep EstimateTemplateCost :: Type -> Type #

Generic EstimateTemplateCostResponse 
Instance details

Defined in Amazonka.CloudFormation.EstimateTemplateCost

Associated Types

type Rep EstimateTemplateCostResponse :: Type -> Type #

Generic ExecuteChangeSet 
Instance details

Defined in Amazonka.CloudFormation.ExecuteChangeSet

Associated Types

type Rep ExecuteChangeSet :: Type -> Type #

Generic ExecuteChangeSetResponse 
Instance details

Defined in Amazonka.CloudFormation.ExecuteChangeSet

Associated Types

type Rep ExecuteChangeSetResponse :: Type -> Type #

Generic GetStackPolicy 
Instance details

Defined in Amazonka.CloudFormation.GetStackPolicy

Associated Types

type Rep GetStackPolicy :: Type -> Type #

Generic GetStackPolicyResponse 
Instance details

Defined in Amazonka.CloudFormation.GetStackPolicy

Associated Types

type Rep GetStackPolicyResponse :: Type -> Type #

Generic GetTemplate 
Instance details

Defined in Amazonka.CloudFormation.GetTemplate

Associated Types

type Rep GetTemplate :: Type -> Type #

Generic GetTemplateResponse 
Instance details

Defined in Amazonka.CloudFormation.GetTemplate

Associated Types

type Rep GetTemplateResponse :: Type -> Type #

Generic GetTemplateSummary 
Instance details

Defined in Amazonka.CloudFormation.GetTemplateSummary

Associated Types

type Rep GetTemplateSummary :: Type -> Type #

Generic GetTemplateSummaryResponse 
Instance details

Defined in Amazonka.CloudFormation.GetTemplateSummary

Associated Types

type Rep GetTemplateSummaryResponse :: Type -> Type #

Generic ImportStacksToStackSet 
Instance details

Defined in Amazonka.CloudFormation.ImportStacksToStackSet

Associated Types

type Rep ImportStacksToStackSet :: Type -> Type #

Generic ImportStacksToStackSetResponse 
Instance details

Defined in Amazonka.CloudFormation.ImportStacksToStackSet

Associated Types

type Rep ImportStacksToStackSetResponse :: Type -> Type #

Generic ListChangeSets 
Instance details

Defined in Amazonka.CloudFormation.ListChangeSets

Associated Types

type Rep ListChangeSets :: Type -> Type #

Generic ListChangeSetsResponse 
Instance details

Defined in Amazonka.CloudFormation.ListChangeSets

Associated Types

type Rep ListChangeSetsResponse :: Type -> Type #

Generic ListExports 
Instance details

Defined in Amazonka.CloudFormation.ListExports

Associated Types

type Rep ListExports :: Type -> Type #

Generic ListExportsResponse 
Instance details

Defined in Amazonka.CloudFormation.ListExports

Associated Types

type Rep ListExportsResponse :: Type -> Type #

Generic ListImports 
Instance details

Defined in Amazonka.CloudFormation.ListImports

Associated Types

type Rep ListImports :: Type -> Type #

Generic ListImportsResponse 
Instance details

Defined in Amazonka.CloudFormation.ListImports

Associated Types

type Rep ListImportsResponse :: Type -> Type #

Generic ListStackInstances 
Instance details

Defined in Amazonka.CloudFormation.ListStackInstances

Associated Types

type Rep ListStackInstances :: Type -> Type #

Generic ListStackInstancesResponse 
Instance details

Defined in Amazonka.CloudFormation.ListStackInstances

Associated Types

type Rep ListStackInstancesResponse :: Type -> Type #

Generic ListStackResources 
Instance details

Defined in Amazonka.CloudFormation.ListStackResources

Associated Types

type Rep ListStackResources :: Type -> Type #

Generic ListStackResourcesResponse 
Instance details

Defined in Amazonka.CloudFormation.ListStackResources

Associated Types

type Rep ListStackResourcesResponse :: Type -> Type #

Generic ListStackSetOperationResults 
Instance details

Defined in Amazonka.CloudFormation.ListStackSetOperationResults

Associated Types

type Rep ListStackSetOperationResults :: Type -> Type #

Generic ListStackSetOperationResultsResponse 
Instance details

Defined in Amazonka.CloudFormation.ListStackSetOperationResults

Generic ListStackSetOperations 
Instance details

Defined in Amazonka.CloudFormation.ListStackSetOperations

Associated Types

type Rep ListStackSetOperations :: Type -> Type #

Generic ListStackSetOperationsResponse 
Instance details

Defined in Amazonka.CloudFormation.ListStackSetOperations

Associated Types

type Rep ListStackSetOperationsResponse :: Type -> Type #

Generic ListStackSets 
Instance details

Defined in Amazonka.CloudFormation.ListStackSets

Associated Types

type Rep ListStackSets :: Type -> Type #

Generic ListStackSetsResponse 
Instance details

Defined in Amazonka.CloudFormation.ListStackSets

Associated Types

type Rep ListStackSetsResponse :: Type -> Type #

Generic ListStacks 
Instance details

Defined in Amazonka.CloudFormation.ListStacks

Associated Types

type Rep ListStacks :: Type -> Type #

Generic ListStacksResponse 
Instance details

Defined in Amazonka.CloudFormation.ListStacks

Associated Types

type Rep ListStacksResponse :: Type -> Type #

Generic ListTypeRegistrations 
Instance details

Defined in Amazonka.CloudFormation.ListTypeRegistrations

Associated Types

type Rep ListTypeRegistrations :: Type -> Type #

Generic ListTypeRegistrationsResponse 
Instance details

Defined in Amazonka.CloudFormation.ListTypeRegistrations

Associated Types

type Rep ListTypeRegistrationsResponse :: Type -> Type #

Generic ListTypeVersions 
Instance details

Defined in Amazonka.CloudFormation.ListTypeVersions

Associated Types

type Rep ListTypeVersions :: Type -> Type #

Generic ListTypeVersionsResponse 
Instance details

Defined in Amazonka.CloudFormation.ListTypeVersions

Associated Types

type Rep ListTypeVersionsResponse :: Type -> Type #

Generic ListTypes 
Instance details

Defined in Amazonka.CloudFormation.ListTypes

Associated Types

type Rep ListTypes :: Type -> Type #

Generic ListTypesResponse 
Instance details

Defined in Amazonka.CloudFormation.ListTypes

Associated Types

type Rep ListTypesResponse :: Type -> Type #

Generic PublishType 
Instance details

Defined in Amazonka.CloudFormation.PublishType

Associated Types

type Rep PublishType :: Type -> Type #

Generic PublishTypeResponse 
Instance details

Defined in Amazonka.CloudFormation.PublishType

Associated Types

type Rep PublishTypeResponse :: Type -> Type #

Generic RecordHandlerProgress 
Instance details

Defined in Amazonka.CloudFormation.RecordHandlerProgress

Associated Types

type Rep RecordHandlerProgress :: Type -> Type #

Generic RecordHandlerProgressResponse 
Instance details

Defined in Amazonka.CloudFormation.RecordHandlerProgress

Associated Types

type Rep RecordHandlerProgressResponse :: Type -> Type #

Generic RegisterPublisher 
Instance details

Defined in Amazonka.CloudFormation.RegisterPublisher

Associated Types

type Rep RegisterPublisher :: Type -> Type #

Generic RegisterPublisherResponse 
Instance details

Defined in Amazonka.CloudFormation.RegisterPublisher

Associated Types

type Rep RegisterPublisherResponse :: Type -> Type #

Generic RegisterType 
Instance details

Defined in Amazonka.CloudFormation.RegisterType

Associated Types

type Rep RegisterType :: Type -> Type #

Generic RegisterTypeResponse 
Instance details

Defined in Amazonka.CloudFormation.RegisterType

Associated Types

type Rep RegisterTypeResponse :: Type -> Type #

Generic RollbackStack 
Instance details

Defined in Amazonka.CloudFormation.RollbackStack

Associated Types

type Rep RollbackStack :: Type -> Type #

Generic RollbackStackResponse 
Instance details

Defined in Amazonka.CloudFormation.RollbackStack

Associated Types

type Rep RollbackStackResponse :: Type -> Type #

Generic SetStackPolicy 
Instance details

Defined in Amazonka.CloudFormation.SetStackPolicy

Associated Types

type Rep SetStackPolicy :: Type -> Type #

Generic SetStackPolicyResponse 
Instance details

Defined in Amazonka.CloudFormation.SetStackPolicy

Associated Types

type Rep SetStackPolicyResponse :: Type -> Type #

Generic SetTypeConfiguration 
Instance details

Defined in Amazonka.CloudFormation.SetTypeConfiguration

Associated Types

type Rep SetTypeConfiguration :: Type -> Type #

Generic SetTypeConfigurationResponse 
Instance details

Defined in Amazonka.CloudFormation.SetTypeConfiguration

Associated Types

type Rep SetTypeConfigurationResponse :: Type -> Type #

Generic SetTypeDefaultVersion 
Instance details

Defined in Amazonka.CloudFormation.SetTypeDefaultVersion

Associated Types

type Rep SetTypeDefaultVersion :: Type -> Type #

Generic SetTypeDefaultVersionResponse 
Instance details

Defined in Amazonka.CloudFormation.SetTypeDefaultVersion

Associated Types

type Rep SetTypeDefaultVersionResponse :: Type -> Type #

Generic SignalResource 
Instance details

Defined in Amazonka.CloudFormation.SignalResource

Associated Types

type Rep SignalResource :: Type -> Type #

Generic SignalResourceResponse 
Instance details

Defined in Amazonka.CloudFormation.SignalResource

Associated Types

type Rep SignalResourceResponse :: Type -> Type #

Generic StopStackSetOperation 
Instance details

Defined in Amazonka.CloudFormation.StopStackSetOperation

Associated Types

type Rep StopStackSetOperation :: Type -> Type #

Generic StopStackSetOperationResponse 
Instance details

Defined in Amazonka.CloudFormation.StopStackSetOperation

Associated Types

type Rep StopStackSetOperationResponse :: Type -> Type #

Generic TestType 
Instance details

Defined in Amazonka.CloudFormation.TestType

Associated Types

type Rep TestType :: Type -> Type #

Methods

from :: TestType -> Rep TestType x #

to :: Rep TestType x -> TestType #

Generic TestTypeResponse 
Instance details

Defined in Amazonka.CloudFormation.TestType

Associated Types

type Rep TestTypeResponse :: Type -> Type #

Generic AccountFilterType 
Instance details

Defined in Amazonka.CloudFormation.Types.AccountFilterType

Associated Types

type Rep AccountFilterType :: Type -> Type #

Generic AccountGateResult 
Instance details

Defined in Amazonka.CloudFormation.Types.AccountGateResult

Associated Types

type Rep AccountGateResult :: Type -> Type #

Generic AccountGateStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.AccountGateStatus

Associated Types

type Rep AccountGateStatus :: Type -> Type #

Generic AccountLimit 
Instance details

Defined in Amazonka.CloudFormation.Types.AccountLimit

Associated Types

type Rep AccountLimit :: Type -> Type #

Generic AutoDeployment 
Instance details

Defined in Amazonka.CloudFormation.Types.AutoDeployment

Associated Types

type Rep AutoDeployment :: Type -> Type #

Generic BatchDescribeTypeConfigurationsError 
Instance details

Defined in Amazonka.CloudFormation.Types.BatchDescribeTypeConfigurationsError

Generic CallAs 
Instance details

Defined in Amazonka.CloudFormation.Types.CallAs

Associated Types

type Rep CallAs :: Type -> Type #

Methods

from :: CallAs -> Rep CallAs x #

to :: Rep CallAs x -> CallAs #

Generic Capability 
Instance details

Defined in Amazonka.CloudFormation.Types.Capability

Associated Types

type Rep Capability :: Type -> Type #

Generic Category 
Instance details

Defined in Amazonka.CloudFormation.Types.Category

Associated Types

type Rep Category :: Type -> Type #

Methods

from :: Category -> Rep Category x #

to :: Rep Category x -> Category #

Generic Change 
Instance details

Defined in Amazonka.CloudFormation.Types.Change

Associated Types

type Rep Change :: Type -> Type #

Methods

from :: Change -> Rep Change x #

to :: Rep Change x -> Change #

Generic ChangeAction 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeAction

Associated Types

type Rep ChangeAction :: Type -> Type #

Generic ChangeSetHook 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetHook

Associated Types

type Rep ChangeSetHook :: Type -> Type #

Generic ChangeSetHookResourceTargetDetails 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetHookResourceTargetDetails

Associated Types

type Rep ChangeSetHookResourceTargetDetails :: Type -> Type #

Generic ChangeSetHookTargetDetails 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetHookTargetDetails

Associated Types

type Rep ChangeSetHookTargetDetails :: Type -> Type #

Generic ChangeSetHooksStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetHooksStatus

Associated Types

type Rep ChangeSetHooksStatus :: Type -> Type #

Generic ChangeSetStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetStatus

Associated Types

type Rep ChangeSetStatus :: Type -> Type #

Generic ChangeSetSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetSummary

Associated Types

type Rep ChangeSetSummary :: Type -> Type #

Generic ChangeSetType 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetType

Associated Types

type Rep ChangeSetType :: Type -> Type #

Generic ChangeSource 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSource

Associated Types

type Rep ChangeSource :: Type -> Type #

Generic ChangeType 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeType

Associated Types

type Rep ChangeType :: Type -> Type #

Generic DeploymentTargets 
Instance details

Defined in Amazonka.CloudFormation.Types.DeploymentTargets

Associated Types

type Rep DeploymentTargets :: Type -> Type #

Generic DeprecatedStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.DeprecatedStatus

Associated Types

type Rep DeprecatedStatus :: Type -> Type #

Generic DifferenceType 
Instance details

Defined in Amazonka.CloudFormation.Types.DifferenceType

Associated Types

type Rep DifferenceType :: Type -> Type #

Generic EvaluationType 
Instance details

Defined in Amazonka.CloudFormation.Types.EvaluationType

Associated Types

type Rep EvaluationType :: Type -> Type #

Generic ExecutionStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.ExecutionStatus

Associated Types

type Rep ExecutionStatus :: Type -> Type #

Generic Export 
Instance details

Defined in Amazonka.CloudFormation.Types.Export

Associated Types

type Rep Export :: Type -> Type #

Methods

from :: Export -> Rep Export x #

to :: Rep Export x -> Export #

Generic HandlerErrorCode 
Instance details

Defined in Amazonka.CloudFormation.Types.HandlerErrorCode

Associated Types

type Rep HandlerErrorCode :: Type -> Type #

Generic HookFailureMode 
Instance details

Defined in Amazonka.CloudFormation.Types.HookFailureMode

Associated Types

type Rep HookFailureMode :: Type -> Type #

Generic HookInvocationPoint 
Instance details

Defined in Amazonka.CloudFormation.Types.HookInvocationPoint

Associated Types

type Rep HookInvocationPoint :: Type -> Type #

Generic HookStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.HookStatus

Associated Types

type Rep HookStatus :: Type -> Type #

Generic HookTargetType 
Instance details

Defined in Amazonka.CloudFormation.Types.HookTargetType

Associated Types

type Rep HookTargetType :: Type -> Type #

Generic IdentityProvider 
Instance details

Defined in Amazonka.CloudFormation.Types.IdentityProvider

Associated Types

type Rep IdentityProvider :: Type -> Type #

Generic LoggingConfig 
Instance details

Defined in Amazonka.CloudFormation.Types.LoggingConfig

Associated Types

type Rep LoggingConfig :: Type -> Type #

Generic ManagedExecution 
Instance details

Defined in Amazonka.CloudFormation.Types.ManagedExecution

Associated Types

type Rep ManagedExecution :: Type -> Type #

Generic ModuleInfo 
Instance details

Defined in Amazonka.CloudFormation.Types.ModuleInfo

Associated Types

type Rep ModuleInfo :: Type -> Type #

Generic OnFailure 
Instance details

Defined in Amazonka.CloudFormation.Types.OnFailure

Associated Types

type Rep OnFailure :: Type -> Type #

Generic OperationResultFilter 
Instance details

Defined in Amazonka.CloudFormation.Types.OperationResultFilter

Associated Types

type Rep OperationResultFilter :: Type -> Type #

Generic OperationResultFilterName 
Instance details

Defined in Amazonka.CloudFormation.Types.OperationResultFilterName

Associated Types

type Rep OperationResultFilterName :: Type -> Type #

Generic OperationStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.OperationStatus

Associated Types

type Rep OperationStatus :: Type -> Type #

Generic Output 
Instance details

Defined in Amazonka.CloudFormation.Types.Output

Associated Types

type Rep Output :: Type -> Type #

Methods

from :: Output -> Rep Output x #

to :: Rep Output x -> Output #

Generic Parameter 
Instance details

Defined in Amazonka.CloudFormation.Types.Parameter

Associated Types

type Rep Parameter :: Type -> Type #

Generic ParameterConstraints 
Instance details

Defined in Amazonka.CloudFormation.Types.ParameterConstraints

Associated Types

type Rep ParameterConstraints :: Type -> Type #

Generic ParameterDeclaration 
Instance details

Defined in Amazonka.CloudFormation.Types.ParameterDeclaration

Associated Types

type Rep ParameterDeclaration :: Type -> Type #

Generic PermissionModels 
Instance details

Defined in Amazonka.CloudFormation.Types.PermissionModels

Associated Types

type Rep PermissionModels :: Type -> Type #

Generic PhysicalResourceIdContextKeyValuePair 
Instance details

Defined in Amazonka.CloudFormation.Types.PhysicalResourceIdContextKeyValuePair

Generic PropertyDifference 
Instance details

Defined in Amazonka.CloudFormation.Types.PropertyDifference

Associated Types

type Rep PropertyDifference :: Type -> Type #

Generic ProvisioningType 
Instance details

Defined in Amazonka.CloudFormation.Types.ProvisioningType

Associated Types

type Rep ProvisioningType :: Type -> Type #

Generic PublisherStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.PublisherStatus

Associated Types

type Rep PublisherStatus :: Type -> Type #

Generic RegionConcurrencyType 
Instance details

Defined in Amazonka.CloudFormation.Types.RegionConcurrencyType

Associated Types

type Rep RegionConcurrencyType :: Type -> Type #

Generic RegistrationStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.RegistrationStatus

Associated Types

type Rep RegistrationStatus :: Type -> Type #

Generic RegistryType 
Instance details

Defined in Amazonka.CloudFormation.Types.RegistryType

Associated Types

type Rep RegistryType :: Type -> Type #

Generic Replacement 
Instance details

Defined in Amazonka.CloudFormation.Types.Replacement

Associated Types

type Rep Replacement :: Type -> Type #

Generic RequiredActivatedType 
Instance details

Defined in Amazonka.CloudFormation.Types.RequiredActivatedType

Associated Types

type Rep RequiredActivatedType :: Type -> Type #

Generic RequiresRecreation 
Instance details

Defined in Amazonka.CloudFormation.Types.RequiresRecreation

Associated Types

type Rep RequiresRecreation :: Type -> Type #

Generic ResourceAttribute 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceAttribute

Associated Types

type Rep ResourceAttribute :: Type -> Type #

Generic ResourceChange 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceChange

Associated Types

type Rep ResourceChange :: Type -> Type #

Generic ResourceChangeDetail 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceChangeDetail

Associated Types

type Rep ResourceChangeDetail :: Type -> Type #

Generic ResourceIdentifierSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceIdentifierSummary

Associated Types

type Rep ResourceIdentifierSummary :: Type -> Type #

Generic ResourceSignalStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceSignalStatus

Associated Types

type Rep ResourceSignalStatus :: Type -> Type #

Generic ResourceStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceStatus

Associated Types

type Rep ResourceStatus :: Type -> Type #

Generic ResourceTargetDefinition 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceTargetDefinition

Associated Types

type Rep ResourceTargetDefinition :: Type -> Type #

Generic ResourceToImport 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceToImport

Associated Types

type Rep ResourceToImport :: Type -> Type #

Generic RollbackConfiguration 
Instance details

Defined in Amazonka.CloudFormation.Types.RollbackConfiguration

Associated Types

type Rep RollbackConfiguration :: Type -> Type #

Generic RollbackTrigger 
Instance details

Defined in Amazonka.CloudFormation.Types.RollbackTrigger

Associated Types

type Rep RollbackTrigger :: Type -> Type #

Generic Stack 
Instance details

Defined in Amazonka.CloudFormation.Types.Stack

Associated Types

type Rep Stack :: Type -> Type #

Methods

from :: Stack -> Rep Stack x #

to :: Rep Stack x -> Stack #

Generic StackDriftDetectionStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackDriftDetectionStatus

Associated Types

type Rep StackDriftDetectionStatus :: Type -> Type #

Generic StackDriftInformation 
Instance details

Defined in Amazonka.CloudFormation.Types.StackDriftInformation

Associated Types

type Rep StackDriftInformation :: Type -> Type #

Generic StackDriftInformationSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackDriftInformationSummary

Associated Types

type Rep StackDriftInformationSummary :: Type -> Type #

Generic StackDriftStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackDriftStatus

Associated Types

type Rep StackDriftStatus :: Type -> Type #

Generic StackEvent 
Instance details

Defined in Amazonka.CloudFormation.Types.StackEvent

Associated Types

type Rep StackEvent :: Type -> Type #

Generic StackInstance 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstance

Associated Types

type Rep StackInstance :: Type -> Type #

Generic StackInstanceComprehensiveStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstanceComprehensiveStatus

Associated Types

type Rep StackInstanceComprehensiveStatus :: Type -> Type #

Generic StackInstanceDetailedStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstanceDetailedStatus

Associated Types

type Rep StackInstanceDetailedStatus :: Type -> Type #

Generic StackInstanceFilter 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstanceFilter

Associated Types

type Rep StackInstanceFilter :: Type -> Type #

Generic StackInstanceFilterName 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstanceFilterName

Associated Types

type Rep StackInstanceFilterName :: Type -> Type #

Generic StackInstanceStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstanceStatus

Associated Types

type Rep StackInstanceStatus :: Type -> Type #

Generic StackInstanceSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstanceSummary

Associated Types

type Rep StackInstanceSummary :: Type -> Type #

Generic StackResource 
Instance details

Defined in Amazonka.CloudFormation.Types.StackResource

Associated Types

type Rep StackResource :: Type -> Type #

Generic StackResourceDetail 
Instance details

Defined in Amazonka.CloudFormation.Types.StackResourceDetail

Associated Types

type Rep StackResourceDetail :: Type -> Type #

Generic StackResourceDrift 
Instance details

Defined in Amazonka.CloudFormation.Types.StackResourceDrift

Associated Types

type Rep StackResourceDrift :: Type -> Type #

Generic StackResourceDriftInformation 
Instance details

Defined in Amazonka.CloudFormation.Types.StackResourceDriftInformation

Associated Types

type Rep StackResourceDriftInformation :: Type -> Type #

Generic StackResourceDriftInformationSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackResourceDriftInformationSummary

Generic StackResourceDriftStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackResourceDriftStatus

Associated Types

type Rep StackResourceDriftStatus :: Type -> Type #

Generic StackResourceSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackResourceSummary

Associated Types

type Rep StackResourceSummary :: Type -> Type #

Generic StackSet 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSet

Associated Types

type Rep StackSet :: Type -> Type #

Methods

from :: StackSet -> Rep StackSet x #

to :: Rep StackSet x -> StackSet #

Generic StackSetDriftDetectionDetails 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetDriftDetectionDetails

Associated Types

type Rep StackSetDriftDetectionDetails :: Type -> Type #

Generic StackSetDriftDetectionStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetDriftDetectionStatus

Associated Types

type Rep StackSetDriftDetectionStatus :: Type -> Type #

Generic StackSetDriftStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetDriftStatus

Associated Types

type Rep StackSetDriftStatus :: Type -> Type #

Generic StackSetOperation 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperation

Associated Types

type Rep StackSetOperation :: Type -> Type #

Generic StackSetOperationAction 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationAction

Associated Types

type Rep StackSetOperationAction :: Type -> Type #

Generic StackSetOperationPreferences 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationPreferences

Associated Types

type Rep StackSetOperationPreferences :: Type -> Type #

Generic StackSetOperationResultStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationResultStatus

Associated Types

type Rep StackSetOperationResultStatus :: Type -> Type #

Generic StackSetOperationResultSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationResultSummary

Associated Types

type Rep StackSetOperationResultSummary :: Type -> Type #

Generic StackSetOperationStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationStatus

Associated Types

type Rep StackSetOperationStatus :: Type -> Type #

Generic StackSetOperationStatusDetails 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationStatusDetails

Associated Types

type Rep StackSetOperationStatusDetails :: Type -> Type #

Generic StackSetOperationSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationSummary

Associated Types

type Rep StackSetOperationSummary :: Type -> Type #

Generic StackSetStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetStatus

Associated Types

type Rep StackSetStatus :: Type -> Type #

Generic StackSetSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetSummary

Associated Types

type Rep StackSetSummary :: Type -> Type #

Generic StackStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackStatus

Associated Types

type Rep StackStatus :: Type -> Type #

Generic StackSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSummary

Associated Types

type Rep StackSummary :: Type -> Type #

Generic Tag 
Instance details

Defined in Amazonka.CloudFormation.Types.Tag

Associated Types

type Rep Tag :: Type -> Type #

Methods

from :: Tag -> Rep Tag x #

to :: Rep Tag x -> Tag #

Generic TemplateParameter 
Instance details

Defined in Amazonka.CloudFormation.Types.TemplateParameter

Associated Types

type Rep TemplateParameter :: Type -> Type #

Generic TemplateStage 
Instance details

Defined in Amazonka.CloudFormation.Types.TemplateStage

Associated Types

type Rep TemplateStage :: Type -> Type #

Generic ThirdPartyType 
Instance details

Defined in Amazonka.CloudFormation.Types.ThirdPartyType

Associated Types

type Rep ThirdPartyType :: Type -> Type #

Generic TypeConfigurationDetails 
Instance details

Defined in Amazonka.CloudFormation.Types.TypeConfigurationDetails

Associated Types

type Rep TypeConfigurationDetails :: Type -> Type #

Generic TypeConfigurationIdentifier 
Instance details

Defined in Amazonka.CloudFormation.Types.TypeConfigurationIdentifier

Associated Types

type Rep TypeConfigurationIdentifier :: Type -> Type #

Generic TypeFilters 
Instance details

Defined in Amazonka.CloudFormation.Types.TypeFilters

Associated Types

type Rep TypeFilters :: Type -> Type #

Generic TypeSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.TypeSummary

Associated Types

type Rep TypeSummary :: Type -> Type #

Generic TypeTestsStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.TypeTestsStatus

Associated Types

type Rep TypeTestsStatus :: Type -> Type #

Generic TypeVersionSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.TypeVersionSummary

Associated Types

type Rep TypeVersionSummary :: Type -> Type #

Generic VersionBump 
Instance details

Defined in Amazonka.CloudFormation.Types.VersionBump

Associated Types

type Rep VersionBump :: Type -> Type #

Generic Visibility 
Instance details

Defined in Amazonka.CloudFormation.Types.Visibility

Associated Types

type Rep Visibility :: Type -> Type #

Generic UpdateStack 
Instance details

Defined in Amazonka.CloudFormation.UpdateStack

Associated Types

type Rep UpdateStack :: Type -> Type #

Generic UpdateStackResponse 
Instance details

Defined in Amazonka.CloudFormation.UpdateStack

Associated Types

type Rep UpdateStackResponse :: Type -> Type #

Generic UpdateStackInstances 
Instance details

Defined in Amazonka.CloudFormation.UpdateStackInstances

Associated Types

type Rep UpdateStackInstances :: Type -> Type #

Generic UpdateStackInstancesResponse 
Instance details

Defined in Amazonka.CloudFormation.UpdateStackInstances

Associated Types

type Rep UpdateStackInstancesResponse :: Type -> Type #

Generic UpdateStackSet 
Instance details

Defined in Amazonka.CloudFormation.UpdateStackSet

Associated Types

type Rep UpdateStackSet :: Type -> Type #

Generic UpdateStackSetResponse 
Instance details

Defined in Amazonka.CloudFormation.UpdateStackSet

Associated Types

type Rep UpdateStackSetResponse :: Type -> Type #

Generic UpdateTerminationProtection 
Instance details

Defined in Amazonka.CloudFormation.UpdateTerminationProtection

Associated Types

type Rep UpdateTerminationProtection :: Type -> Type #

Generic UpdateTerminationProtectionResponse 
Instance details

Defined in Amazonka.CloudFormation.UpdateTerminationProtection

Generic ValidateTemplate 
Instance details

Defined in Amazonka.CloudFormation.ValidateTemplate

Associated Types

type Rep ValidateTemplate :: Type -> Type #

Generic ValidateTemplateResponse 
Instance details

Defined in Amazonka.CloudFormation.ValidateTemplate

Associated Types

type Rep ValidateTemplateResponse :: Type -> Type #

Generic Base64 
Instance details

Defined in Amazonka.Data.Base64

Associated Types

type Rep Base64 :: Type -> Type #

Methods

from :: Base64 -> Rep Base64 x #

to :: Rep Base64 x -> Base64 #

Generic ResponseBody 
Instance details

Defined in Amazonka.Data.Body

Associated Types

type Rep ResponseBody :: Type -> Type #

Generic Format 
Instance details

Defined in Amazonka.Data.Time

Associated Types

type Rep Format :: Type -> Type #

Methods

from :: Format -> Rep Format x #

to :: Rep Format x -> Format #

Generic Abbrev 
Instance details

Defined in Amazonka.Types

Associated Types

type Rep Abbrev :: Type -> Type #

Methods

from :: Abbrev -> Rep Abbrev x #

to :: Rep Abbrev x -> Abbrev #

Generic AccessKey 
Instance details

Defined in Amazonka.Types

Associated Types

type Rep AccessKey :: Type -> Type #

Generic AuthEnv 
Instance details

Defined in Amazonka.Types

Associated Types

type Rep AuthEnv :: Type -> Type #

Methods

from :: AuthEnv -> Rep AuthEnv x #

to :: Rep AuthEnv x -> AuthEnv #

Generic Endpoint 
Instance details

Defined in Amazonka.Types

Associated Types

type Rep Endpoint :: Type -> Type #

Methods

from :: Endpoint -> Rep Endpoint x #

to :: Rep Endpoint x -> Endpoint #

Generic Error 
Instance details

Defined in Amazonka.Types

Associated Types

type Rep Error :: Type -> Type #

Methods

from :: Error -> Rep Error x #

to :: Rep Error x -> Error #

Generic ErrorMessage 
Instance details

Defined in Amazonka.Types

Associated Types

type Rep ErrorMessage :: Type -> Type #

Generic Region 
Instance details

Defined in Amazonka.Types

Associated Types

type Rep Region :: Type -> Type #

Methods

from :: Region -> Rep Region x #

to :: Rep Region x -> Region #

Generic RequestId 
Instance details

Defined in Amazonka.Types

Associated Types

type Rep RequestId :: Type -> Type #

Generic Retry 
Instance details

Defined in Amazonka.Types

Associated Types

type Rep Retry :: Type -> Type #

Methods

from :: Retry -> Rep Retry x #

to :: Rep Retry x -> Retry #

Generic S3AddressingStyle 
Instance details

Defined in Amazonka.Types

Associated Types

type Rep S3AddressingStyle :: Type -> Type #

Generic Seconds 
Instance details

Defined in Amazonka.Types

Associated Types

type Rep Seconds :: Type -> Type #

Methods

from :: Seconds -> Rep Seconds x #

to :: Rep Seconds x -> Seconds #

Generic SecretKey 
Instance details

Defined in Amazonka.Types

Associated Types

type Rep SecretKey :: Type -> Type #

Generic SerializeError 
Instance details

Defined in Amazonka.Types

Associated Types

type Rep SerializeError :: Type -> Type #

Generic Service 
Instance details

Defined in Amazonka.Types

Associated Types

type Rep Service :: Type -> Type #

Methods

from :: Service -> Rep Service x #

to :: Rep Service x -> Service #

Generic ServiceError 
Instance details

Defined in Amazonka.Types

Associated Types

type Rep ServiceError :: Type -> Type #

Generic SessionToken 
Instance details

Defined in Amazonka.Types

Associated Types

type Rep SessionToken :: Type -> Type #

Generic DescribeAvailabilityZones 
Instance details

Defined in Amazonka.EC2.DescribeAvailabilityZones

Associated Types

type Rep DescribeAvailabilityZones :: Type -> Type #

Generic DescribeAvailabilityZonesResponse 
Instance details

Defined in Amazonka.EC2.DescribeAvailabilityZones

Associated Types

type Rep DescribeAvailabilityZonesResponse :: Type -> Type #

Generic DeleteTag 
Instance details

Defined in Amazonka.EC2.Internal

Associated Types

type Rep DeleteTag :: Type -> Type #

Generic AcceleratorCount 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorCount

Associated Types

type Rep AcceleratorCount :: Type -> Type #

Generic AcceleratorCountRequest 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorCountRequest

Associated Types

type Rep AcceleratorCountRequest :: Type -> Type #

Generic AcceleratorManufacturer 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorManufacturer

Associated Types

type Rep AcceleratorManufacturer :: Type -> Type #

Generic AcceleratorName 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorName

Associated Types

type Rep AcceleratorName :: Type -> Type #

Generic AcceleratorTotalMemoryMiB 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorTotalMemoryMiB

Associated Types

type Rep AcceleratorTotalMemoryMiB :: Type -> Type #

Generic AcceleratorTotalMemoryMiBRequest 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorTotalMemoryMiBRequest

Associated Types

type Rep AcceleratorTotalMemoryMiBRequest :: Type -> Type #

Generic AcceleratorType 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorType

Associated Types

type Rep AcceleratorType :: Type -> Type #

Generic AccessScopeAnalysisFinding 
Instance details

Defined in Amazonka.EC2.Types.AccessScopeAnalysisFinding

Associated Types

type Rep AccessScopeAnalysisFinding :: Type -> Type #

Generic AccessScopePath 
Instance details

Defined in Amazonka.EC2.Types.AccessScopePath

Associated Types

type Rep AccessScopePath :: Type -> Type #

Generic AccessScopePathRequest 
Instance details

Defined in Amazonka.EC2.Types.AccessScopePathRequest

Associated Types

type Rep AccessScopePathRequest :: Type -> Type #

Generic AccountAttribute 
Instance details

Defined in Amazonka.EC2.Types.AccountAttribute

Associated Types

type Rep AccountAttribute :: Type -> Type #

Generic AccountAttributeName 
Instance details

Defined in Amazonka.EC2.Types.AccountAttributeName

Associated Types

type Rep AccountAttributeName :: Type -> Type #

Generic AccountAttributeValue 
Instance details

Defined in Amazonka.EC2.Types.AccountAttributeValue

Associated Types

type Rep AccountAttributeValue :: Type -> Type #

Generic ActiveInstance 
Instance details

Defined in Amazonka.EC2.Types.ActiveInstance

Associated Types

type Rep ActiveInstance :: Type -> Type #

Generic ActivityStatus 
Instance details

Defined in Amazonka.EC2.Types.ActivityStatus

Associated Types

type Rep ActivityStatus :: Type -> Type #

Generic AddIpamOperatingRegion 
Instance details

Defined in Amazonka.EC2.Types.AddIpamOperatingRegion

Associated Types

type Rep AddIpamOperatingRegion :: Type -> Type #

Generic AddPrefixListEntry 
Instance details

Defined in Amazonka.EC2.Types.AddPrefixListEntry

Associated Types

type Rep AddPrefixListEntry :: Type -> Type #

Generic AddedPrincipal 
Instance details

Defined in Amazonka.EC2.Types.AddedPrincipal

Associated Types

type Rep AddedPrincipal :: Type -> Type #

Generic AdditionalDetail 
Instance details

Defined in Amazonka.EC2.Types.AdditionalDetail

Associated Types

type Rep AdditionalDetail :: Type -> Type #

Generic Address 
Instance details

Defined in Amazonka.EC2.Types.Address

Associated Types

type Rep Address :: Type -> Type #

Methods

from :: Address -> Rep Address x #

to :: Rep Address x -> Address #

Generic AddressAttribute 
Instance details

Defined in Amazonka.EC2.Types.AddressAttribute

Associated Types

type Rep AddressAttribute :: Type -> Type #

Generic AddressAttributeName 
Instance details

Defined in Amazonka.EC2.Types.AddressAttributeName

Associated Types

type Rep AddressAttributeName :: Type -> Type #

Generic AddressFamily 
Instance details

Defined in Amazonka.EC2.Types.AddressFamily

Associated Types

type Rep AddressFamily :: Type -> Type #

Generic AddressStatus 
Instance details

Defined in Amazonka.EC2.Types.AddressStatus

Associated Types

type Rep AddressStatus :: Type -> Type #

Generic AddressTransfer 
Instance details

Defined in Amazonka.EC2.Types.AddressTransfer

Associated Types

type Rep AddressTransfer :: Type -> Type #

Generic AddressTransferStatus 
Instance details

Defined in Amazonka.EC2.Types.AddressTransferStatus

Associated Types

type Rep AddressTransferStatus :: Type -> Type #

Generic Affinity 
Instance details

Defined in Amazonka.EC2.Types.Affinity

Associated Types

type Rep Affinity :: Type -> Type #

Methods

from :: Affinity -> Rep Affinity x #

to :: Rep Affinity x -> Affinity #

Generic AllocationState 
Instance details

Defined in Amazonka.EC2.Types.AllocationState

Associated Types

type Rep AllocationState :: Type -> Type #

Generic AllocationStrategy 
Instance details

Defined in Amazonka.EC2.Types.AllocationStrategy

Associated Types

type Rep AllocationStrategy :: Type -> Type #

Generic AllocationType 
Instance details

Defined in Amazonka.EC2.Types.AllocationType

Associated Types

type Rep AllocationType :: Type -> Type #

Generic AllowedPrincipal 
Instance details

Defined in Amazonka.EC2.Types.AllowedPrincipal

Associated Types

type Rep AllowedPrincipal :: Type -> Type #

Generic AllowsMultipleInstanceTypes 
Instance details

Defined in Amazonka.EC2.Types.AllowsMultipleInstanceTypes

Associated Types

type Rep AllowsMultipleInstanceTypes :: Type -> Type #

Generic AlternatePathHint 
Instance details

Defined in Amazonka.EC2.Types.AlternatePathHint

Associated Types

type Rep AlternatePathHint :: Type -> Type #

Generic AnalysisAclRule 
Instance details

Defined in Amazonka.EC2.Types.AnalysisAclRule

Associated Types

type Rep AnalysisAclRule :: Type -> Type #

Generic AnalysisComponent 
Instance details

Defined in Amazonka.EC2.Types.AnalysisComponent

Associated Types

type Rep AnalysisComponent :: Type -> Type #

Generic AnalysisLoadBalancerListener 
Instance details

Defined in Amazonka.EC2.Types.AnalysisLoadBalancerListener

Associated Types

type Rep AnalysisLoadBalancerListener :: Type -> Type #

Generic AnalysisLoadBalancerTarget 
Instance details

Defined in Amazonka.EC2.Types.AnalysisLoadBalancerTarget

Associated Types

type Rep AnalysisLoadBalancerTarget :: Type -> Type #

Generic AnalysisPacketHeader 
Instance details

Defined in Amazonka.EC2.Types.AnalysisPacketHeader

Associated Types

type Rep AnalysisPacketHeader :: Type -> Type #

Generic AnalysisRouteTableRoute 
Instance details

Defined in Amazonka.EC2.Types.AnalysisRouteTableRoute

Associated Types

type Rep AnalysisRouteTableRoute :: Type -> Type #

Generic AnalysisSecurityGroupRule 
Instance details

Defined in Amazonka.EC2.Types.AnalysisSecurityGroupRule

Associated Types

type Rep AnalysisSecurityGroupRule :: Type -> Type #

Generic AnalysisStatus 
Instance details

Defined in Amazonka.EC2.Types.AnalysisStatus

Associated Types

type Rep AnalysisStatus :: Type -> Type #

Generic ApplianceModeSupportValue 
Instance details

Defined in Amazonka.EC2.Types.ApplianceModeSupportValue

Associated Types

type Rep ApplianceModeSupportValue :: Type -> Type #

Generic ArchitectureType 
Instance details

Defined in Amazonka.EC2.Types.ArchitectureType

Associated Types

type Rep ArchitectureType :: Type -> Type #

Generic ArchitectureValues 
Instance details

Defined in Amazonka.EC2.Types.ArchitectureValues

Associated Types

type Rep ArchitectureValues :: Type -> Type #

Generic AssignedPrivateIpAddress 
Instance details

Defined in Amazonka.EC2.Types.AssignedPrivateIpAddress

Associated Types

type Rep AssignedPrivateIpAddress :: Type -> Type #

Generic AssociatedNetworkType 
Instance details

Defined in Amazonka.EC2.Types.AssociatedNetworkType

Associated Types

type Rep AssociatedNetworkType :: Type -> Type #

Generic AssociatedRole 
Instance details

Defined in Amazonka.EC2.Types.AssociatedRole

Associated Types

type Rep AssociatedRole :: Type -> Type #

Generic AssociatedTargetNetwork 
Instance details

Defined in Amazonka.EC2.Types.AssociatedTargetNetwork

Associated Types

type Rep AssociatedTargetNetwork :: Type -> Type #

Generic AssociationStatus 
Instance details

Defined in Amazonka.EC2.Types.AssociationStatus

Associated Types

type Rep AssociationStatus :: Type -> Type #

Generic AssociationStatusCode 
Instance details

Defined in Amazonka.EC2.Types.AssociationStatusCode

Associated Types

type Rep AssociationStatusCode :: Type -> Type #

Generic AthenaIntegration 
Instance details

Defined in Amazonka.EC2.Types.AthenaIntegration

Associated Types

type Rep AthenaIntegration :: Type -> Type #

Generic AttachmentEnaSrdSpecification 
Instance details

Defined in Amazonka.EC2.Types.AttachmentEnaSrdSpecification

Associated Types

type Rep AttachmentEnaSrdSpecification :: Type -> Type #

Generic AttachmentEnaSrdUdpSpecification 
Instance details

Defined in Amazonka.EC2.Types.AttachmentEnaSrdUdpSpecification

Associated Types

type Rep AttachmentEnaSrdUdpSpecification :: Type -> Type #

Generic AttachmentStatus 
Instance details

Defined in Amazonka.EC2.Types.AttachmentStatus

Associated Types

type Rep AttachmentStatus :: Type -> Type #

Generic AttributeBooleanValue 
Instance details

Defined in Amazonka.EC2.Types.AttributeBooleanValue

Associated Types

type Rep AttributeBooleanValue :: Type -> Type #

Generic AttributeValue 
Instance details

Defined in Amazonka.EC2.Types.AttributeValue

Associated Types

type Rep AttributeValue :: Type -> Type #

Generic AuthorizationRule 
Instance details

Defined in Amazonka.EC2.Types.AuthorizationRule

Associated Types

type Rep AuthorizationRule :: Type -> Type #

Generic AutoAcceptSharedAssociationsValue 
Instance details

Defined in Amazonka.EC2.Types.AutoAcceptSharedAssociationsValue

Associated Types

type Rep AutoAcceptSharedAssociationsValue :: Type -> Type #

Generic AutoAcceptSharedAttachmentsValue 
Instance details

Defined in Amazonka.EC2.Types.AutoAcceptSharedAttachmentsValue

Associated Types

type Rep AutoAcceptSharedAttachmentsValue :: Type -> Type #

Generic AutoPlacement 
Instance details

Defined in Amazonka.EC2.Types.AutoPlacement

Associated Types

type Rep AutoPlacement :: Type -> Type #

Generic AvailabilityZone 
Instance details

Defined in Amazonka.EC2.Types.AvailabilityZone

Associated Types

type Rep AvailabilityZone :: Type -> Type #

Generic AvailabilityZoneMessage 
Instance details

Defined in Amazonka.EC2.Types.AvailabilityZoneMessage

Associated Types

type Rep AvailabilityZoneMessage :: Type -> Type #

Generic AvailabilityZoneOptInStatus 
Instance details

Defined in Amazonka.EC2.Types.AvailabilityZoneOptInStatus

Associated Types

type Rep AvailabilityZoneOptInStatus :: Type -> Type #

Generic AvailabilityZoneState 
Instance details

Defined in Amazonka.EC2.Types.AvailabilityZoneState

Associated Types

type Rep AvailabilityZoneState :: Type -> Type #

Generic AvailableCapacity 
Instance details

Defined in Amazonka.EC2.Types.AvailableCapacity

Associated Types

type Rep AvailableCapacity :: Type -> Type #

Generic BareMetal 
Instance details

Defined in Amazonka.EC2.Types.BareMetal

Associated Types

type Rep BareMetal :: Type -> Type #

Generic BaselineEbsBandwidthMbps 
Instance details

Defined in Amazonka.EC2.Types.BaselineEbsBandwidthMbps

Associated Types

type Rep BaselineEbsBandwidthMbps :: Type -> Type #

Generic BaselineEbsBandwidthMbpsRequest 
Instance details

Defined in Amazonka.EC2.Types.BaselineEbsBandwidthMbpsRequest

Associated Types

type Rep BaselineEbsBandwidthMbpsRequest :: Type -> Type #

Generic BatchState 
Instance details

Defined in Amazonka.EC2.Types.BatchState

Associated Types

type Rep BatchState :: Type -> Type #

Generic BgpStatus 
Instance details

Defined in Amazonka.EC2.Types.BgpStatus

Associated Types

type Rep BgpStatus :: Type -> Type #

Generic BlobAttributeValue 
Instance details

Defined in Amazonka.EC2.Types.BlobAttributeValue

Associated Types

type Rep BlobAttributeValue :: Type -> Type #

Generic BlockDeviceMapping 
Instance details

Defined in Amazonka.EC2.Types.BlockDeviceMapping

Associated Types

type Rep BlockDeviceMapping :: Type -> Type #

Generic BootModeType 
Instance details

Defined in Amazonka.EC2.Types.BootModeType

Associated Types

type Rep BootModeType :: Type -> Type #

Generic BootModeValues 
Instance details

Defined in Amazonka.EC2.Types.BootModeValues

Associated Types

type Rep BootModeValues :: Type -> Type #

Generic BundleTask 
Instance details

Defined in Amazonka.EC2.Types.BundleTask

Associated Types

type Rep BundleTask :: Type -> Type #

Generic BundleTaskError 
Instance details

Defined in Amazonka.EC2.Types.BundleTaskError

Associated Types

type Rep BundleTaskError :: Type -> Type #

Generic BundleTaskState 
Instance details

Defined in Amazonka.EC2.Types.BundleTaskState

Associated Types

type Rep BundleTaskState :: Type -> Type #

Generic BurstablePerformance 
Instance details

Defined in Amazonka.EC2.Types.BurstablePerformance

Associated Types

type Rep BurstablePerformance :: Type -> Type #

Generic ByoipCidr 
Instance details

Defined in Amazonka.EC2.Types.ByoipCidr

Associated Types

type Rep ByoipCidr :: Type -> Type #

Generic ByoipCidrState 
Instance details

Defined in Amazonka.EC2.Types.ByoipCidrState

Associated Types

type Rep ByoipCidrState :: Type -> Type #

Generic CancelBatchErrorCode 
Instance details

Defined in Amazonka.EC2.Types.CancelBatchErrorCode

Associated Types

type Rep CancelBatchErrorCode :: Type -> Type #

Generic CancelCapacityReservationFleetError 
Instance details

Defined in Amazonka.EC2.Types.CancelCapacityReservationFleetError

Generic CancelSpotFleetRequestsError 
Instance details

Defined in Amazonka.EC2.Types.CancelSpotFleetRequestsError

Associated Types

type Rep CancelSpotFleetRequestsError :: Type -> Type #

Generic CancelSpotFleetRequestsErrorItem 
Instance details

Defined in Amazonka.EC2.Types.CancelSpotFleetRequestsErrorItem

Associated Types

type Rep CancelSpotFleetRequestsErrorItem :: Type -> Type #

Generic CancelSpotFleetRequestsSuccessItem 
Instance details

Defined in Amazonka.EC2.Types.CancelSpotFleetRequestsSuccessItem

Associated Types

type Rep CancelSpotFleetRequestsSuccessItem :: Type -> Type #

Generic CancelSpotInstanceRequestState 
Instance details

Defined in Amazonka.EC2.Types.CancelSpotInstanceRequestState

Associated Types

type Rep CancelSpotInstanceRequestState :: Type -> Type #

Generic CancelledSpotInstanceRequest 
Instance details

Defined in Amazonka.EC2.Types.CancelledSpotInstanceRequest

Associated Types

type Rep CancelledSpotInstanceRequest :: Type -> Type #

Generic CapacityAllocation 
Instance details

Defined in Amazonka.EC2.Types.CapacityAllocation

Associated Types

type Rep CapacityAllocation :: Type -> Type #

Generic CapacityReservation 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservation

Associated Types

type Rep CapacityReservation :: Type -> Type #

Generic CapacityReservationFleet 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationFleet

Associated Types

type Rep CapacityReservationFleet :: Type -> Type #

Generic CapacityReservationFleetCancellationState 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationFleetCancellationState

Generic CapacityReservationFleetState 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationFleetState

Associated Types

type Rep CapacityReservationFleetState :: Type -> Type #

Generic CapacityReservationGroup 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationGroup

Associated Types

type Rep CapacityReservationGroup :: Type -> Type #

Generic CapacityReservationInstancePlatform 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationInstancePlatform

Generic CapacityReservationOptions 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationOptions

Associated Types

type Rep CapacityReservationOptions :: Type -> Type #

Generic CapacityReservationOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationOptionsRequest

Associated Types

type Rep CapacityReservationOptionsRequest :: Type -> Type #

Generic CapacityReservationPreference 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationPreference

Associated Types

type Rep CapacityReservationPreference :: Type -> Type #

Generic CapacityReservationSpecification 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationSpecification

Associated Types

type Rep CapacityReservationSpecification :: Type -> Type #

Generic CapacityReservationSpecificationResponse 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationSpecificationResponse

Generic CapacityReservationState 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationState

Associated Types

type Rep CapacityReservationState :: Type -> Type #

Generic CapacityReservationTarget 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationTarget

Associated Types

type Rep CapacityReservationTarget :: Type -> Type #

Generic CapacityReservationTargetResponse 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationTargetResponse

Associated Types

type Rep CapacityReservationTargetResponse :: Type -> Type #

Generic CapacityReservationTenancy 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationTenancy

Associated Types

type Rep CapacityReservationTenancy :: Type -> Type #

Generic CarrierGateway 
Instance details

Defined in Amazonka.EC2.Types.CarrierGateway

Associated Types

type Rep CarrierGateway :: Type -> Type #

Generic CarrierGatewayState 
Instance details

Defined in Amazonka.EC2.Types.CarrierGatewayState

Associated Types

type Rep CarrierGatewayState :: Type -> Type #

Generic CertificateAuthentication 
Instance details

Defined in Amazonka.EC2.Types.CertificateAuthentication

Associated Types

type Rep CertificateAuthentication :: Type -> Type #

Generic CertificateAuthenticationRequest 
Instance details

Defined in Amazonka.EC2.Types.CertificateAuthenticationRequest

Associated Types

type Rep CertificateAuthenticationRequest :: Type -> Type #

Generic CidrAuthorizationContext 
Instance details

Defined in Amazonka.EC2.Types.CidrAuthorizationContext

Associated Types

type Rep CidrAuthorizationContext :: Type -> Type #

Generic CidrBlock 
Instance details

Defined in Amazonka.EC2.Types.CidrBlock

Associated Types

type Rep CidrBlock :: Type -> Type #

Generic ClassicLinkDnsSupport 
Instance details

Defined in Amazonka.EC2.Types.ClassicLinkDnsSupport

Associated Types

type Rep ClassicLinkDnsSupport :: Type -> Type #

Generic ClassicLinkInstance 
Instance details

Defined in Amazonka.EC2.Types.ClassicLinkInstance

Associated Types

type Rep ClassicLinkInstance :: Type -> Type #

Generic ClassicLoadBalancer 
Instance details

Defined in Amazonka.EC2.Types.ClassicLoadBalancer

Associated Types

type Rep ClassicLoadBalancer :: Type -> Type #

Generic ClassicLoadBalancersConfig 
Instance details

Defined in Amazonka.EC2.Types.ClassicLoadBalancersConfig

Associated Types

type Rep ClassicLoadBalancersConfig :: Type -> Type #

Generic ClientCertificateRevocationListStatus 
Instance details

Defined in Amazonka.EC2.Types.ClientCertificateRevocationListStatus

Generic ClientCertificateRevocationListStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientCertificateRevocationListStatusCode

Generic ClientConnectOptions 
Instance details

Defined in Amazonka.EC2.Types.ClientConnectOptions

Associated Types

type Rep ClientConnectOptions :: Type -> Type #

Generic ClientConnectResponseOptions 
Instance details

Defined in Amazonka.EC2.Types.ClientConnectResponseOptions

Associated Types

type Rep ClientConnectResponseOptions :: Type -> Type #

Generic ClientData 
Instance details

Defined in Amazonka.EC2.Types.ClientData

Associated Types

type Rep ClientData :: Type -> Type #

Generic ClientLoginBannerOptions 
Instance details

Defined in Amazonka.EC2.Types.ClientLoginBannerOptions

Associated Types

type Rep ClientLoginBannerOptions :: Type -> Type #

Generic ClientLoginBannerResponseOptions 
Instance details

Defined in Amazonka.EC2.Types.ClientLoginBannerResponseOptions

Associated Types

type Rep ClientLoginBannerResponseOptions :: Type -> Type #

Generic ClientVpnAuthentication 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnAuthentication

Associated Types

type Rep ClientVpnAuthentication :: Type -> Type #

Generic ClientVpnAuthenticationRequest 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnAuthenticationRequest

Associated Types

type Rep ClientVpnAuthenticationRequest :: Type -> Type #

Generic ClientVpnAuthenticationType 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnAuthenticationType

Associated Types

type Rep ClientVpnAuthenticationType :: Type -> Type #

Generic ClientVpnAuthorizationRuleStatus 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnAuthorizationRuleStatus

Associated Types

type Rep ClientVpnAuthorizationRuleStatus :: Type -> Type #

Generic ClientVpnAuthorizationRuleStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnAuthorizationRuleStatusCode

Generic ClientVpnConnection 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnConnection

Associated Types

type Rep ClientVpnConnection :: Type -> Type #

Generic ClientVpnConnectionStatus 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnConnectionStatus

Associated Types

type Rep ClientVpnConnectionStatus :: Type -> Type #

Generic ClientVpnConnectionStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnConnectionStatusCode

Associated Types

type Rep ClientVpnConnectionStatusCode :: Type -> Type #

Generic ClientVpnEndpoint 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnEndpoint

Associated Types

type Rep ClientVpnEndpoint :: Type -> Type #

Generic ClientVpnEndpointAttributeStatus 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnEndpointAttributeStatus

Associated Types

type Rep ClientVpnEndpointAttributeStatus :: Type -> Type #

Generic ClientVpnEndpointAttributeStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnEndpointAttributeStatusCode

Generic ClientVpnEndpointStatus 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnEndpointStatus

Associated Types

type Rep ClientVpnEndpointStatus :: Type -> Type #

Generic ClientVpnEndpointStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnEndpointStatusCode

Associated Types

type Rep ClientVpnEndpointStatusCode :: Type -> Type #

Generic ClientVpnRoute 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnRoute

Associated Types

type Rep ClientVpnRoute :: Type -> Type #

Generic ClientVpnRouteStatus 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnRouteStatus

Associated Types

type Rep ClientVpnRouteStatus :: Type -> Type #

Generic ClientVpnRouteStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnRouteStatusCode

Associated Types

type Rep ClientVpnRouteStatusCode :: Type -> Type #

Generic CloudWatchLogOptions 
Instance details

Defined in Amazonka.EC2.Types.CloudWatchLogOptions

Associated Types

type Rep CloudWatchLogOptions :: Type -> Type #

Generic CloudWatchLogOptionsSpecification 
Instance details

Defined in Amazonka.EC2.Types.CloudWatchLogOptionsSpecification

Associated Types

type Rep CloudWatchLogOptionsSpecification :: Type -> Type #

Generic CoipAddressUsage 
Instance details

Defined in Amazonka.EC2.Types.CoipAddressUsage

Associated Types

type Rep CoipAddressUsage :: Type -> Type #

Generic CoipCidr 
Instance details

Defined in Amazonka.EC2.Types.CoipCidr

Associated Types

type Rep CoipCidr :: Type -> Type #

Methods

from :: CoipCidr -> Rep CoipCidr x #

to :: Rep CoipCidr x -> CoipCidr #

Generic CoipPool 
Instance details

Defined in Amazonka.EC2.Types.CoipPool

Associated Types

type Rep CoipPool :: Type -> Type #

Methods

from :: CoipPool -> Rep CoipPool x #

to :: Rep CoipPool x -> CoipPool #

Generic ConnectionLogOptions 
Instance details

Defined in Amazonka.EC2.Types.ConnectionLogOptions

Associated Types

type Rep ConnectionLogOptions :: Type -> Type #

Generic ConnectionLogResponseOptions 
Instance details

Defined in Amazonka.EC2.Types.ConnectionLogResponseOptions

Associated Types

type Rep ConnectionLogResponseOptions :: Type -> Type #

Generic ConnectionNotification 
Instance details

Defined in Amazonka.EC2.Types.ConnectionNotification

Associated Types

type Rep ConnectionNotification :: Type -> Type #

Generic ConnectionNotificationState 
Instance details

Defined in Amazonka.EC2.Types.ConnectionNotificationState

Associated Types

type Rep ConnectionNotificationState :: Type -> Type #

Generic ConnectionNotificationType 
Instance details

Defined in Amazonka.EC2.Types.ConnectionNotificationType

Associated Types

type Rep ConnectionNotificationType :: Type -> Type #

Generic ConnectivityType 
Instance details

Defined in Amazonka.EC2.Types.ConnectivityType

Associated Types

type Rep ConnectivityType :: Type -> Type #

Generic ContainerFormat 
Instance details

Defined in Amazonka.EC2.Types.ContainerFormat

Associated Types

type Rep ContainerFormat :: Type -> Type #

Generic ConversionTask 
Instance details

Defined in Amazonka.EC2.Types.ConversionTask

Associated Types

type Rep ConversionTask :: Type -> Type #

Generic ConversionTaskState 
Instance details

Defined in Amazonka.EC2.Types.ConversionTaskState

Associated Types

type Rep ConversionTaskState :: Type -> Type #

Generic CopyTagsFromSource 
Instance details

Defined in Amazonka.EC2.Types.CopyTagsFromSource

Associated Types

type Rep CopyTagsFromSource :: Type -> Type #

Generic CpuManufacturer 
Instance details

Defined in Amazonka.EC2.Types.CpuManufacturer

Associated Types

type Rep CpuManufacturer :: Type -> Type #

Generic CpuOptions 
Instance details

Defined in Amazonka.EC2.Types.CpuOptions

Associated Types

type Rep CpuOptions :: Type -> Type #

Generic CpuOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.CpuOptionsRequest

Associated Types

type Rep CpuOptionsRequest :: Type -> Type #

Generic CreateFleetError 
Instance details

Defined in Amazonka.EC2.Types.CreateFleetError

Associated Types

type Rep CreateFleetError :: Type -> Type #

Generic CreateFleetInstance 
Instance details

Defined in Amazonka.EC2.Types.CreateFleetInstance

Associated Types

type Rep CreateFleetInstance :: Type -> Type #

Generic CreateTransitGatewayConnectRequestOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateTransitGatewayConnectRequestOptions

Generic CreateTransitGatewayMulticastDomainRequestOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateTransitGatewayMulticastDomainRequestOptions

Generic CreateTransitGatewayPeeringAttachmentRequestOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateTransitGatewayPeeringAttachmentRequestOptions

Generic CreateTransitGatewayVpcAttachmentRequestOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateTransitGatewayVpcAttachmentRequestOptions

Generic CreateVerifiedAccessEndpointEniOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateVerifiedAccessEndpointEniOptions

Generic CreateVerifiedAccessEndpointLoadBalancerOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateVerifiedAccessEndpointLoadBalancerOptions

Generic CreateVerifiedAccessTrustProviderDeviceOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateVerifiedAccessTrustProviderDeviceOptions

Generic CreateVerifiedAccessTrustProviderOidcOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateVerifiedAccessTrustProviderOidcOptions

Generic CreateVolumePermission 
Instance details

Defined in Amazonka.EC2.Types.CreateVolumePermission

Associated Types

type Rep CreateVolumePermission :: Type -> Type #

Generic CreateVolumePermissionModifications 
Instance details

Defined in Amazonka.EC2.Types.CreateVolumePermissionModifications

Generic CreditSpecification 
Instance details

Defined in Amazonka.EC2.Types.CreditSpecification

Associated Types

type Rep CreditSpecification :: Type -> Type #

Generic CreditSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.CreditSpecificationRequest

Associated Types

type Rep CreditSpecificationRequest :: Type -> Type #

Generic CurrencyCodeValues 
Instance details

Defined in Amazonka.EC2.Types.CurrencyCodeValues

Associated Types

type Rep CurrencyCodeValues :: Type -> Type #

Generic CustomerGateway 
Instance details

Defined in Amazonka.EC2.Types.CustomerGateway

Associated Types

type Rep CustomerGateway :: Type -> Type #

Generic DataQuery 
Instance details

Defined in Amazonka.EC2.Types.DataQuery

Associated Types

type Rep DataQuery :: Type -> Type #

Generic DataResponse 
Instance details

Defined in Amazonka.EC2.Types.DataResponse

Associated Types

type Rep DataResponse :: Type -> Type #

Generic DatafeedSubscriptionState 
Instance details

Defined in Amazonka.EC2.Types.DatafeedSubscriptionState

Associated Types

type Rep DatafeedSubscriptionState :: Type -> Type #

Generic DefaultRouteTableAssociationValue 
Instance details

Defined in Amazonka.EC2.Types.DefaultRouteTableAssociationValue

Associated Types

type Rep DefaultRouteTableAssociationValue :: Type -> Type #

Generic DefaultRouteTablePropagationValue 
Instance details

Defined in Amazonka.EC2.Types.DefaultRouteTablePropagationValue

Associated Types

type Rep DefaultRouteTablePropagationValue :: Type -> Type #

Generic DefaultTargetCapacityType 
Instance details

Defined in Amazonka.EC2.Types.DefaultTargetCapacityType

Associated Types

type Rep DefaultTargetCapacityType :: Type -> Type #

Generic DeleteFleetError 
Instance details

Defined in Amazonka.EC2.Types.DeleteFleetError

Associated Types

type Rep DeleteFleetError :: Type -> Type #

Generic DeleteFleetErrorCode 
Instance details

Defined in Amazonka.EC2.Types.DeleteFleetErrorCode

Associated Types

type Rep DeleteFleetErrorCode :: Type -> Type #

Generic DeleteFleetErrorItem 
Instance details

Defined in Amazonka.EC2.Types.DeleteFleetErrorItem

Associated Types

type Rep DeleteFleetErrorItem :: Type -> Type #

Generic DeleteFleetSuccessItem 
Instance details

Defined in Amazonka.EC2.Types.DeleteFleetSuccessItem

Associated Types

type Rep DeleteFleetSuccessItem :: Type -> Type #

Generic DeleteLaunchTemplateVersionsResponseErrorItem 
Instance details

Defined in Amazonka.EC2.Types.DeleteLaunchTemplateVersionsResponseErrorItem

Generic DeleteLaunchTemplateVersionsResponseSuccessItem 
Instance details

Defined in Amazonka.EC2.Types.DeleteLaunchTemplateVersionsResponseSuccessItem

Generic DeleteQueuedReservedInstancesError 
Instance details

Defined in Amazonka.EC2.Types.DeleteQueuedReservedInstancesError

Associated Types

type Rep DeleteQueuedReservedInstancesError :: Type -> Type #

Generic DeleteQueuedReservedInstancesErrorCode 
Instance details

Defined in Amazonka.EC2.Types.DeleteQueuedReservedInstancesErrorCode

Generic DeregisterInstanceTagAttributeRequest 
Instance details

Defined in Amazonka.EC2.Types.DeregisterInstanceTagAttributeRequest

Generic DescribeFastLaunchImagesSuccessItem 
Instance details

Defined in Amazonka.EC2.Types.DescribeFastLaunchImagesSuccessItem

Generic DescribeFastSnapshotRestoreSuccessItem 
Instance details

Defined in Amazonka.EC2.Types.DescribeFastSnapshotRestoreSuccessItem

Generic DescribeFleetError 
Instance details

Defined in Amazonka.EC2.Types.DescribeFleetError

Associated Types

type Rep DescribeFleetError :: Type -> Type #

Generic DescribeFleetsInstances 
Instance details

Defined in Amazonka.EC2.Types.DescribeFleetsInstances

Associated Types

type Rep DescribeFleetsInstances :: Type -> Type #

Generic DestinationFileFormat 
Instance details

Defined in Amazonka.EC2.Types.DestinationFileFormat

Associated Types

type Rep DestinationFileFormat :: Type -> Type #

Generic DestinationOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.DestinationOptionsRequest

Associated Types

type Rep DestinationOptionsRequest :: Type -> Type #

Generic DestinationOptionsResponse 
Instance details

Defined in Amazonka.EC2.Types.DestinationOptionsResponse

Associated Types

type Rep DestinationOptionsResponse :: Type -> Type #

Generic DeviceOptions 
Instance details

Defined in Amazonka.EC2.Types.DeviceOptions

Associated Types

type Rep DeviceOptions :: Type -> Type #

Generic DeviceTrustProviderType 
Instance details

Defined in Amazonka.EC2.Types.DeviceTrustProviderType

Associated Types

type Rep DeviceTrustProviderType :: Type -> Type #

Generic DeviceType 
Instance details

Defined in Amazonka.EC2.Types.DeviceType

Associated Types

type Rep DeviceType :: Type -> Type #

Generic DhcpConfiguration 
Instance details

Defined in Amazonka.EC2.Types.DhcpConfiguration

Associated Types

type Rep DhcpConfiguration :: Type -> Type #

Generic DhcpOptions 
Instance details

Defined in Amazonka.EC2.Types.DhcpOptions

Associated Types

type Rep DhcpOptions :: Type -> Type #

Generic DirectoryServiceAuthentication 
Instance details

Defined in Amazonka.EC2.Types.DirectoryServiceAuthentication

Associated Types

type Rep DirectoryServiceAuthentication :: Type -> Type #

Generic DirectoryServiceAuthenticationRequest 
Instance details

Defined in Amazonka.EC2.Types.DirectoryServiceAuthenticationRequest

Generic DisableFastSnapshotRestoreErrorItem 
Instance details

Defined in Amazonka.EC2.Types.DisableFastSnapshotRestoreErrorItem

Generic DisableFastSnapshotRestoreStateError 
Instance details

Defined in Amazonka.EC2.Types.DisableFastSnapshotRestoreStateError

Generic DisableFastSnapshotRestoreStateErrorItem 
Instance details

Defined in Amazonka.EC2.Types.DisableFastSnapshotRestoreStateErrorItem

Generic DisableFastSnapshotRestoreSuccessItem 
Instance details

Defined in Amazonka.EC2.Types.DisableFastSnapshotRestoreSuccessItem

Generic DiskImage 
Instance details

Defined in Amazonka.EC2.Types.DiskImage

Associated Types

type Rep DiskImage :: Type -> Type #

Generic DiskImageDescription 
Instance details

Defined in Amazonka.EC2.Types.DiskImageDescription

Associated Types

type Rep DiskImageDescription :: Type -> Type #

Generic DiskImageDetail 
Instance details

Defined in Amazonka.EC2.Types.DiskImageDetail

Associated Types

type Rep DiskImageDetail :: Type -> Type #

Generic DiskImageFormat 
Instance details

Defined in Amazonka.EC2.Types.DiskImageFormat

Associated Types

type Rep DiskImageFormat :: Type -> Type #

Generic DiskImageVolumeDescription 
Instance details

Defined in Amazonka.EC2.Types.DiskImageVolumeDescription

Associated Types

type Rep DiskImageVolumeDescription :: Type -> Type #

Generic DiskInfo 
Instance details

Defined in Amazonka.EC2.Types.DiskInfo

Associated Types

type Rep DiskInfo :: Type -> Type #

Methods

from :: DiskInfo -> Rep DiskInfo x #

to :: Rep DiskInfo x -> DiskInfo #

Generic DiskType 
Instance details

Defined in Amazonka.EC2.Types.DiskType

Associated Types

type Rep DiskType :: Type -> Type #

Methods

from :: DiskType -> Rep DiskType x #

to :: Rep DiskType x -> DiskType #

Generic DnsEntry 
Instance details

Defined in Amazonka.EC2.Types.DnsEntry

Associated Types

type Rep DnsEntry :: Type -> Type #

Methods

from :: DnsEntry -> Rep DnsEntry x #

to :: Rep DnsEntry x -> DnsEntry #

Generic DnsNameState 
Instance details

Defined in Amazonka.EC2.Types.DnsNameState

Associated Types

type Rep DnsNameState :: Type -> Type #

Generic DnsOptions 
Instance details

Defined in Amazonka.EC2.Types.DnsOptions

Associated Types

type Rep DnsOptions :: Type -> Type #

Generic DnsOptionsSpecification 
Instance details

Defined in Amazonka.EC2.Types.DnsOptionsSpecification

Associated Types

type Rep DnsOptionsSpecification :: Type -> Type #

Generic DnsRecordIpType 
Instance details

Defined in Amazonka.EC2.Types.DnsRecordIpType

Associated Types

type Rep DnsRecordIpType :: Type -> Type #

Generic DnsServersOptionsModifyStructure 
Instance details

Defined in Amazonka.EC2.Types.DnsServersOptionsModifyStructure

Associated Types

type Rep DnsServersOptionsModifyStructure :: Type -> Type #

Generic DnsSupportValue 
Instance details

Defined in Amazonka.EC2.Types.DnsSupportValue

Associated Types

type Rep DnsSupportValue :: Type -> Type #

Generic DomainType 
Instance details

Defined in Amazonka.EC2.Types.DomainType

Associated Types

type Rep DomainType :: Type -> Type #

Generic DynamicRoutingValue 
Instance details

Defined in Amazonka.EC2.Types.DynamicRoutingValue

Associated Types

type Rep DynamicRoutingValue :: Type -> Type #

Generic EbsBlockDevice 
Instance details

Defined in Amazonka.EC2.Types.EbsBlockDevice

Associated Types

type Rep EbsBlockDevice :: Type -> Type #

Generic EbsEncryptionSupport 
Instance details

Defined in Amazonka.EC2.Types.EbsEncryptionSupport

Associated Types

type Rep EbsEncryptionSupport :: Type -> Type #

Generic EbsInfo 
Instance details

Defined in Amazonka.EC2.Types.EbsInfo

Associated Types

type Rep EbsInfo :: Type -> Type #

Methods

from :: EbsInfo -> Rep EbsInfo x #

to :: Rep EbsInfo x -> EbsInfo #

Generic EbsInstanceBlockDevice 
Instance details

Defined in Amazonka.EC2.Types.EbsInstanceBlockDevice

Associated Types

type Rep EbsInstanceBlockDevice :: Type -> Type #

Generic EbsInstanceBlockDeviceSpecification 
Instance details

Defined in Amazonka.EC2.Types.EbsInstanceBlockDeviceSpecification

Generic EbsNvmeSupport 
Instance details

Defined in Amazonka.EC2.Types.EbsNvmeSupport

Associated Types

type Rep EbsNvmeSupport :: Type -> Type #

Generic EbsOptimizedInfo 
Instance details

Defined in Amazonka.EC2.Types.EbsOptimizedInfo

Associated Types

type Rep EbsOptimizedInfo :: Type -> Type #

Generic EbsOptimizedSupport 
Instance details

Defined in Amazonka.EC2.Types.EbsOptimizedSupport

Associated Types

type Rep EbsOptimizedSupport :: Type -> Type #

Generic EfaInfo 
Instance details

Defined in Amazonka.EC2.Types.EfaInfo

Associated Types

type Rep EfaInfo :: Type -> Type #

Methods

from :: EfaInfo -> Rep EfaInfo x #

to :: Rep EfaInfo x -> EfaInfo #

Generic EgressOnlyInternetGateway 
Instance details

Defined in Amazonka.EC2.Types.EgressOnlyInternetGateway

Associated Types

type Rep EgressOnlyInternetGateway :: Type -> Type #

Generic ElasticGpuAssociation 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpuAssociation

Associated Types

type Rep ElasticGpuAssociation :: Type -> Type #

Generic ElasticGpuHealth 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpuHealth

Associated Types

type Rep ElasticGpuHealth :: Type -> Type #

Generic ElasticGpuSpecification 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpuSpecification

Associated Types

type Rep ElasticGpuSpecification :: Type -> Type #

Generic ElasticGpuSpecificationResponse 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpuSpecificationResponse

Associated Types

type Rep ElasticGpuSpecificationResponse :: Type -> Type #

Generic ElasticGpuState 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpuState

Associated Types

type Rep ElasticGpuState :: Type -> Type #

Generic ElasticGpuStatus 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpuStatus

Associated Types

type Rep ElasticGpuStatus :: Type -> Type #

Generic ElasticGpus 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpus

Associated Types

type Rep ElasticGpus :: Type -> Type #

Generic ElasticInferenceAccelerator 
Instance details

Defined in Amazonka.EC2.Types.ElasticInferenceAccelerator

Associated Types

type Rep ElasticInferenceAccelerator :: Type -> Type #

Generic ElasticInferenceAcceleratorAssociation 
Instance details

Defined in Amazonka.EC2.Types.ElasticInferenceAcceleratorAssociation

Generic EnaSrdSpecification 
Instance details

Defined in Amazonka.EC2.Types.EnaSrdSpecification

Associated Types

type Rep EnaSrdSpecification :: Type -> Type #

Generic EnaSrdUdpSpecification 
Instance details

Defined in Amazonka.EC2.Types.EnaSrdUdpSpecification

Associated Types

type Rep EnaSrdUdpSpecification :: Type -> Type #

Generic EnaSupport 
Instance details

Defined in Amazonka.EC2.Types.EnaSupport

Associated Types

type Rep EnaSupport :: Type -> Type #

Generic EnableFastSnapshotRestoreErrorItem 
Instance details

Defined in Amazonka.EC2.Types.EnableFastSnapshotRestoreErrorItem

Associated Types

type Rep EnableFastSnapshotRestoreErrorItem :: Type -> Type #

Generic EnableFastSnapshotRestoreStateError 
Instance details

Defined in Amazonka.EC2.Types.EnableFastSnapshotRestoreStateError

Generic EnableFastSnapshotRestoreStateErrorItem 
Instance details

Defined in Amazonka.EC2.Types.EnableFastSnapshotRestoreStateErrorItem

Generic EnableFastSnapshotRestoreSuccessItem 
Instance details

Defined in Amazonka.EC2.Types.EnableFastSnapshotRestoreSuccessItem

Generic EnclaveOptions 
Instance details

Defined in Amazonka.EC2.Types.EnclaveOptions

Associated Types

type Rep EnclaveOptions :: Type -> Type #

Generic EnclaveOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.EnclaveOptionsRequest

Associated Types

type Rep EnclaveOptionsRequest :: Type -> Type #

Generic EndDateType 
Instance details

Defined in Amazonka.EC2.Types.EndDateType

Associated Types

type Rep EndDateType :: Type -> Type #

Generic EphemeralNvmeSupport 
Instance details

Defined in Amazonka.EC2.Types.EphemeralNvmeSupport

Associated Types

type Rep EphemeralNvmeSupport :: Type -> Type #

Generic EventCode 
Instance details

Defined in Amazonka.EC2.Types.EventCode

Associated Types

type Rep EventCode :: Type -> Type #

Generic EventInformation 
Instance details

Defined in Amazonka.EC2.Types.EventInformation

Associated Types

type Rep EventInformation :: Type -> Type #

Generic EventType 
Instance details

Defined in Amazonka.EC2.Types.EventType

Associated Types

type Rep EventType :: Type -> Type #

Generic ExcessCapacityTerminationPolicy 
Instance details

Defined in Amazonka.EC2.Types.ExcessCapacityTerminationPolicy

Associated Types

type Rep ExcessCapacityTerminationPolicy :: Type -> Type #

Generic Explanation 
Instance details

Defined in Amazonka.EC2.Types.Explanation

Associated Types

type Rep Explanation :: Type -> Type #

Generic ExportEnvironment 
Instance details

Defined in Amazonka.EC2.Types.ExportEnvironment

Associated Types

type Rep ExportEnvironment :: Type -> Type #

Generic ExportImageTask 
Instance details

Defined in Amazonka.EC2.Types.ExportImageTask

Associated Types

type Rep ExportImageTask :: Type -> Type #

Generic ExportTask 
Instance details

Defined in Amazonka.EC2.Types.ExportTask

Associated Types

type Rep ExportTask :: Type -> Type #

Generic ExportTaskS3Location 
Instance details

Defined in Amazonka.EC2.Types.ExportTaskS3Location

Associated Types

type Rep ExportTaskS3Location :: Type -> Type #

Generic ExportTaskS3LocationRequest 
Instance details

Defined in Amazonka.EC2.Types.ExportTaskS3LocationRequest

Associated Types

type Rep ExportTaskS3LocationRequest :: Type -> Type #

Generic ExportTaskState 
Instance details

Defined in Amazonka.EC2.Types.ExportTaskState

Associated Types

type Rep ExportTaskState :: Type -> Type #

Generic ExportToS3Task 
Instance details

Defined in Amazonka.EC2.Types.ExportToS3Task

Associated Types

type Rep ExportToS3Task :: Type -> Type #

Generic ExportToS3TaskSpecification 
Instance details

Defined in Amazonka.EC2.Types.ExportToS3TaskSpecification

Associated Types

type Rep ExportToS3TaskSpecification :: Type -> Type #

Generic FailedCapacityReservationFleetCancellationResult 
Instance details

Defined in Amazonka.EC2.Types.FailedCapacityReservationFleetCancellationResult

Generic FailedQueuedPurchaseDeletion 
Instance details

Defined in Amazonka.EC2.Types.FailedQueuedPurchaseDeletion

Associated Types

type Rep FailedQueuedPurchaseDeletion :: Type -> Type #

Generic FastLaunchLaunchTemplateSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.FastLaunchLaunchTemplateSpecificationRequest

Generic FastLaunchLaunchTemplateSpecificationResponse 
Instance details

Defined in Amazonka.EC2.Types.FastLaunchLaunchTemplateSpecificationResponse

Generic FastLaunchResourceType 
Instance details

Defined in Amazonka.EC2.Types.FastLaunchResourceType

Associated Types

type Rep FastLaunchResourceType :: Type -> Type #

Generic FastLaunchSnapshotConfigurationRequest 
Instance details

Defined in Amazonka.EC2.Types.FastLaunchSnapshotConfigurationRequest

Generic FastLaunchSnapshotConfigurationResponse 
Instance details

Defined in Amazonka.EC2.Types.FastLaunchSnapshotConfigurationResponse

Generic FastLaunchStateCode 
Instance details

Defined in Amazonka.EC2.Types.FastLaunchStateCode

Associated Types

type Rep FastLaunchStateCode :: Type -> Type #

Generic FastSnapshotRestoreStateCode 
Instance details

Defined in Amazonka.EC2.Types.FastSnapshotRestoreStateCode

Associated Types

type Rep FastSnapshotRestoreStateCode :: Type -> Type #

Generic FederatedAuthentication 
Instance details

Defined in Amazonka.EC2.Types.FederatedAuthentication

Associated Types

type Rep FederatedAuthentication :: Type -> Type #

Generic FederatedAuthenticationRequest 
Instance details

Defined in Amazonka.EC2.Types.FederatedAuthenticationRequest

Associated Types

type Rep FederatedAuthenticationRequest :: Type -> Type #

Generic Filter 
Instance details

Defined in Amazonka.EC2.Types.Filter

Associated Types

type Rep Filter :: Type -> Type #

Methods

from :: Filter -> Rep Filter x #

to :: Rep Filter x -> Filter #

Generic FindingsFound 
Instance details

Defined in Amazonka.EC2.Types.FindingsFound

Associated Types

type Rep FindingsFound :: Type -> Type #

Generic FleetActivityStatus 
Instance details

Defined in Amazonka.EC2.Types.FleetActivityStatus

Associated Types

type Rep FleetActivityStatus :: Type -> Type #

Generic FleetCapacityReservation 
Instance details

Defined in Amazonka.EC2.Types.FleetCapacityReservation

Associated Types

type Rep FleetCapacityReservation :: Type -> Type #

Generic FleetCapacityReservationTenancy 
Instance details

Defined in Amazonka.EC2.Types.FleetCapacityReservationTenancy

Associated Types

type Rep FleetCapacityReservationTenancy :: Type -> Type #

Generic FleetCapacityReservationUsageStrategy 
Instance details

Defined in Amazonka.EC2.Types.FleetCapacityReservationUsageStrategy

Generic FleetData 
Instance details

Defined in Amazonka.EC2.Types.FleetData

Associated Types

type Rep FleetData :: Type -> Type #

Generic FleetEventType 
Instance details

Defined in Amazonka.EC2.Types.FleetEventType

Associated Types

type Rep FleetEventType :: Type -> Type #

Generic FleetExcessCapacityTerminationPolicy 
Instance details

Defined in Amazonka.EC2.Types.FleetExcessCapacityTerminationPolicy

Generic FleetInstanceMatchCriteria 
Instance details

Defined in Amazonka.EC2.Types.FleetInstanceMatchCriteria

Associated Types

type Rep FleetInstanceMatchCriteria :: Type -> Type #

Generic FleetLaunchTemplateConfig 
Instance details

Defined in Amazonka.EC2.Types.FleetLaunchTemplateConfig

Associated Types

type Rep FleetLaunchTemplateConfig :: Type -> Type #

Generic FleetLaunchTemplateConfigRequest 
Instance details

Defined in Amazonka.EC2.Types.FleetLaunchTemplateConfigRequest

Associated Types

type Rep FleetLaunchTemplateConfigRequest :: Type -> Type #

Generic FleetLaunchTemplateOverrides 
Instance details

Defined in Amazonka.EC2.Types.FleetLaunchTemplateOverrides

Associated Types

type Rep FleetLaunchTemplateOverrides :: Type -> Type #

Generic FleetLaunchTemplateOverridesRequest 
Instance details

Defined in Amazonka.EC2.Types.FleetLaunchTemplateOverridesRequest

Generic FleetLaunchTemplateSpecification 
Instance details

Defined in Amazonka.EC2.Types.FleetLaunchTemplateSpecification

Associated Types

type Rep FleetLaunchTemplateSpecification :: Type -> Type #

Generic FleetLaunchTemplateSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.FleetLaunchTemplateSpecificationRequest

Generic FleetOnDemandAllocationStrategy 
Instance details

Defined in Amazonka.EC2.Types.FleetOnDemandAllocationStrategy

Associated Types

type Rep FleetOnDemandAllocationStrategy :: Type -> Type #

Generic FleetReplacementStrategy 
Instance details

Defined in Amazonka.EC2.Types.FleetReplacementStrategy

Associated Types

type Rep FleetReplacementStrategy :: Type -> Type #

Generic FleetSpotCapacityRebalance 
Instance details

Defined in Amazonka.EC2.Types.FleetSpotCapacityRebalance

Associated Types

type Rep FleetSpotCapacityRebalance :: Type -> Type #

Generic FleetSpotCapacityRebalanceRequest 
Instance details

Defined in Amazonka.EC2.Types.FleetSpotCapacityRebalanceRequest

Associated Types

type Rep FleetSpotCapacityRebalanceRequest :: Type -> Type #

Generic FleetSpotMaintenanceStrategies 
Instance details

Defined in Amazonka.EC2.Types.FleetSpotMaintenanceStrategies

Associated Types

type Rep FleetSpotMaintenanceStrategies :: Type -> Type #

Generic FleetSpotMaintenanceStrategiesRequest 
Instance details

Defined in Amazonka.EC2.Types.FleetSpotMaintenanceStrategiesRequest

Generic FleetStateCode 
Instance details

Defined in Amazonka.EC2.Types.FleetStateCode

Associated Types

type Rep FleetStateCode :: Type -> Type #

Generic FleetType 
Instance details

Defined in Amazonka.EC2.Types.FleetType

Associated Types

type Rep FleetType :: Type -> Type #

Generic FlowLog 
Instance details

Defined in Amazonka.EC2.Types.FlowLog

Associated Types

type Rep FlowLog :: Type -> Type #

Methods

from :: FlowLog -> Rep FlowLog x #

to :: Rep FlowLog x -> FlowLog #

Generic FlowLogsResourceType 
Instance details

Defined in Amazonka.EC2.Types.FlowLogsResourceType

Associated Types

type Rep FlowLogsResourceType :: Type -> Type #

Generic FpgaDeviceInfo 
Instance details

Defined in Amazonka.EC2.Types.FpgaDeviceInfo

Associated Types

type Rep FpgaDeviceInfo :: Type -> Type #

Generic FpgaDeviceMemoryInfo 
Instance details

Defined in Amazonka.EC2.Types.FpgaDeviceMemoryInfo

Associated Types

type Rep FpgaDeviceMemoryInfo :: Type -> Type #

Generic FpgaImage 
Instance details

Defined in Amazonka.EC2.Types.FpgaImage

Associated Types

type Rep FpgaImage :: Type -> Type #

Generic FpgaImageAttribute 
Instance details

Defined in Amazonka.EC2.Types.FpgaImageAttribute

Associated Types

type Rep FpgaImageAttribute :: Type -> Type #

Generic FpgaImageAttributeName 
Instance details

Defined in Amazonka.EC2.Types.FpgaImageAttributeName

Associated Types

type Rep FpgaImageAttributeName :: Type -> Type #

Generic FpgaImageState 
Instance details

Defined in Amazonka.EC2.Types.FpgaImageState

Associated Types

type Rep FpgaImageState :: Type -> Type #

Generic FpgaImageStateCode 
Instance details

Defined in Amazonka.EC2.Types.FpgaImageStateCode

Associated Types

type Rep FpgaImageStateCode :: Type -> Type #

Generic FpgaInfo 
Instance details

Defined in Amazonka.EC2.Types.FpgaInfo

Associated Types

type Rep FpgaInfo :: Type -> Type #

Methods

from :: FpgaInfo -> Rep FpgaInfo x #

to :: Rep FpgaInfo x -> FpgaInfo #

Generic GatewayAssociationState 
Instance details

Defined in Amazonka.EC2.Types.GatewayAssociationState

Associated Types

type Rep GatewayAssociationState :: Type -> Type #

Generic GatewayType 
Instance details

Defined in Amazonka.EC2.Types.GatewayType

Associated Types

type Rep GatewayType :: Type -> Type #

Generic GpuDeviceInfo 
Instance details

Defined in Amazonka.EC2.Types.GpuDeviceInfo

Associated Types

type Rep GpuDeviceInfo :: Type -> Type #

Generic GpuDeviceMemoryInfo 
Instance details

Defined in Amazonka.EC2.Types.GpuDeviceMemoryInfo

Associated Types

type Rep GpuDeviceMemoryInfo :: Type -> Type #

Generic GpuInfo 
Instance details

Defined in Amazonka.EC2.Types.GpuInfo

Associated Types

type Rep GpuInfo :: Type -> Type #

Methods

from :: GpuInfo -> Rep GpuInfo x #

to :: Rep GpuInfo x -> GpuInfo #

Generic GroupIdentifier 
Instance details

Defined in Amazonka.EC2.Types.GroupIdentifier

Associated Types

type Rep GroupIdentifier :: Type -> Type #

Generic HibernationOptions 
Instance details

Defined in Amazonka.EC2.Types.HibernationOptions

Associated Types

type Rep HibernationOptions :: Type -> Type #

Generic HibernationOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.HibernationOptionsRequest

Associated Types

type Rep HibernationOptionsRequest :: Type -> Type #

Generic HistoryRecord 
Instance details

Defined in Amazonka.EC2.Types.HistoryRecord

Associated Types

type Rep HistoryRecord :: Type -> Type #

Generic HistoryRecordEntry 
Instance details

Defined in Amazonka.EC2.Types.HistoryRecordEntry

Associated Types

type Rep HistoryRecordEntry :: Type -> Type #

Generic Host 
Instance details

Defined in Amazonka.EC2.Types.Host

Associated Types

type Rep Host :: Type -> Type #

Methods

from :: Host -> Rep Host x #

to :: Rep Host x -> Host #

Generic HostInstance 
Instance details

Defined in Amazonka.EC2.Types.HostInstance

Associated Types

type Rep HostInstance :: Type -> Type #

Generic HostOffering 
Instance details

Defined in Amazonka.EC2.Types.HostOffering

Associated Types

type Rep HostOffering :: Type -> Type #

Generic HostProperties 
Instance details

Defined in Amazonka.EC2.Types.HostProperties

Associated Types

type Rep HostProperties :: Type -> Type #

Generic HostRecovery 
Instance details

Defined in Amazonka.EC2.Types.HostRecovery

Associated Types

type Rep HostRecovery :: Type -> Type #

Generic HostReservation 
Instance details

Defined in Amazonka.EC2.Types.HostReservation

Associated Types

type Rep HostReservation :: Type -> Type #

Generic HostTenancy 
Instance details

Defined in Amazonka.EC2.Types.HostTenancy

Associated Types

type Rep HostTenancy :: Type -> Type #

Generic HostnameType 
Instance details

Defined in Amazonka.EC2.Types.HostnameType

Associated Types

type Rep HostnameType :: Type -> Type #

Generic HttpTokensState 
Instance details

Defined in Amazonka.EC2.Types.HttpTokensState

Associated Types

type Rep HttpTokensState :: Type -> Type #

Generic HypervisorType 
Instance details

Defined in Amazonka.EC2.Types.HypervisorType

Associated Types

type Rep HypervisorType :: Type -> Type #

Generic IKEVersionsListValue 
Instance details

Defined in Amazonka.EC2.Types.IKEVersionsListValue

Associated Types

type Rep IKEVersionsListValue :: Type -> Type #

Generic IKEVersionsRequestListValue 
Instance details

Defined in Amazonka.EC2.Types.IKEVersionsRequestListValue

Associated Types

type Rep IKEVersionsRequestListValue :: Type -> Type #

Generic IamInstanceProfile 
Instance details

Defined in Amazonka.EC2.Types.IamInstanceProfile

Associated Types

type Rep IamInstanceProfile :: Type -> Type #

Generic IamInstanceProfileAssociation 
Instance details

Defined in Amazonka.EC2.Types.IamInstanceProfileAssociation

Associated Types

type Rep IamInstanceProfileAssociation :: Type -> Type #

Generic IamInstanceProfileAssociationState 
Instance details

Defined in Amazonka.EC2.Types.IamInstanceProfileAssociationState

Associated Types

type Rep IamInstanceProfileAssociationState :: Type -> Type #

Generic IamInstanceProfileSpecification 
Instance details

Defined in Amazonka.EC2.Types.IamInstanceProfileSpecification

Associated Types

type Rep IamInstanceProfileSpecification :: Type -> Type #

Generic IcmpTypeCode 
Instance details

Defined in Amazonka.EC2.Types.IcmpTypeCode

Associated Types

type Rep IcmpTypeCode :: Type -> Type #

Generic IdFormat 
Instance details

Defined in Amazonka.EC2.Types.IdFormat

Associated Types

type Rep IdFormat :: Type -> Type #

Methods

from :: IdFormat -> Rep IdFormat x #

to :: Rep IdFormat x -> IdFormat #

Generic Igmpv2SupportValue 
Instance details

Defined in Amazonka.EC2.Types.Igmpv2SupportValue

Associated Types

type Rep Igmpv2SupportValue :: Type -> Type #

Generic Image 
Instance details

Defined in Amazonka.EC2.Types.Image

Associated Types

type Rep Image :: Type -> Type #

Methods

from :: Image -> Rep Image x #

to :: Rep Image x -> Image #

Generic ImageAttributeName 
Instance details

Defined in Amazonka.EC2.Types.ImageAttributeName

Associated Types

type Rep ImageAttributeName :: Type -> Type #

Generic ImageDiskContainer 
Instance details

Defined in Amazonka.EC2.Types.ImageDiskContainer

Associated Types

type Rep ImageDiskContainer :: Type -> Type #

Generic ImageRecycleBinInfo 
Instance details

Defined in Amazonka.EC2.Types.ImageRecycleBinInfo

Associated Types

type Rep ImageRecycleBinInfo :: Type -> Type #

Generic ImageState 
Instance details

Defined in Amazonka.EC2.Types.ImageState

Associated Types

type Rep ImageState :: Type -> Type #

Generic ImageTypeValues 
Instance details

Defined in Amazonka.EC2.Types.ImageTypeValues

Associated Types

type Rep ImageTypeValues :: Type -> Type #

Generic ImdsSupportValues 
Instance details

Defined in Amazonka.EC2.Types.ImdsSupportValues

Associated Types

type Rep ImdsSupportValues :: Type -> Type #

Generic ImportImageLicenseConfigurationRequest 
Instance details

Defined in Amazonka.EC2.Types.ImportImageLicenseConfigurationRequest

Generic ImportImageLicenseConfigurationResponse 
Instance details

Defined in Amazonka.EC2.Types.ImportImageLicenseConfigurationResponse

Generic ImportImageTask 
Instance details

Defined in Amazonka.EC2.Types.ImportImageTask

Associated Types

type Rep ImportImageTask :: Type -> Type #

Generic ImportInstanceLaunchSpecification 
Instance details

Defined in Amazonka.EC2.Types.ImportInstanceLaunchSpecification

Associated Types

type Rep ImportInstanceLaunchSpecification :: Type -> Type #

Generic ImportInstanceTaskDetails 
Instance details

Defined in Amazonka.EC2.Types.ImportInstanceTaskDetails

Associated Types

type Rep ImportInstanceTaskDetails :: Type -> Type #

Generic ImportInstanceVolumeDetailItem 
Instance details

Defined in Amazonka.EC2.Types.ImportInstanceVolumeDetailItem

Associated Types

type Rep ImportInstanceVolumeDetailItem :: Type -> Type #

Generic ImportSnapshotTask 
Instance details

Defined in Amazonka.EC2.Types.ImportSnapshotTask

Associated Types

type Rep ImportSnapshotTask :: Type -> Type #

Generic ImportVolumeTaskDetails 
Instance details

Defined in Amazonka.EC2.Types.ImportVolumeTaskDetails

Associated Types

type Rep ImportVolumeTaskDetails :: Type -> Type #

Generic InferenceAcceleratorInfo 
Instance details

Defined in Amazonka.EC2.Types.InferenceAcceleratorInfo

Associated Types

type Rep InferenceAcceleratorInfo :: Type -> Type #

Generic InferenceDeviceInfo 
Instance details

Defined in Amazonka.EC2.Types.InferenceDeviceInfo

Associated Types

type Rep InferenceDeviceInfo :: Type -> Type #

Generic Instance 
Instance details

Defined in Amazonka.EC2.Types.Instance

Associated Types

type Rep Instance :: Type -> Type #

Methods

from :: Instance -> Rep Instance x #

to :: Rep Instance x -> Instance #

Generic InstanceAttributeName 
Instance details

Defined in Amazonka.EC2.Types.InstanceAttributeName

Associated Types

type Rep InstanceAttributeName :: Type -> Type #

Generic InstanceAutoRecoveryState 
Instance details

Defined in Amazonka.EC2.Types.InstanceAutoRecoveryState

Associated Types

type Rep InstanceAutoRecoveryState :: Type -> Type #

Generic InstanceBlockDeviceMapping 
Instance details

Defined in Amazonka.EC2.Types.InstanceBlockDeviceMapping

Associated Types

type Rep InstanceBlockDeviceMapping :: Type -> Type #

Generic InstanceBlockDeviceMappingSpecification 
Instance details

Defined in Amazonka.EC2.Types.InstanceBlockDeviceMappingSpecification

Generic InstanceCapacity 
Instance details

Defined in Amazonka.EC2.Types.InstanceCapacity

Associated Types

type Rep InstanceCapacity :: Type -> Type #

Generic InstanceCount 
Instance details

Defined in Amazonka.EC2.Types.InstanceCount

Associated Types

type Rep InstanceCount :: Type -> Type #

Generic InstanceCreditSpecification 
Instance details

Defined in Amazonka.EC2.Types.InstanceCreditSpecification

Associated Types

type Rep InstanceCreditSpecification :: Type -> Type #

Generic InstanceCreditSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceCreditSpecificationRequest

Associated Types

type Rep InstanceCreditSpecificationRequest :: Type -> Type #

Generic InstanceEventWindow 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindow

Associated Types

type Rep InstanceEventWindow :: Type -> Type #

Generic InstanceEventWindowAssociationRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindowAssociationRequest

Generic InstanceEventWindowAssociationTarget 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindowAssociationTarget

Generic InstanceEventWindowDisassociationRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindowDisassociationRequest

Generic InstanceEventWindowState 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindowState

Associated Types

type Rep InstanceEventWindowState :: Type -> Type #

Generic InstanceEventWindowStateChange 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindowStateChange

Associated Types

type Rep InstanceEventWindowStateChange :: Type -> Type #

Generic InstanceEventWindowTimeRange 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindowTimeRange

Associated Types

type Rep InstanceEventWindowTimeRange :: Type -> Type #

Generic InstanceEventWindowTimeRangeRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindowTimeRangeRequest

Generic InstanceExportDetails 
Instance details

Defined in Amazonka.EC2.Types.InstanceExportDetails

Associated Types

type Rep InstanceExportDetails :: Type -> Type #

Generic InstanceFamilyCreditSpecification 
Instance details

Defined in Amazonka.EC2.Types.InstanceFamilyCreditSpecification

Associated Types

type Rep InstanceFamilyCreditSpecification :: Type -> Type #

Generic InstanceGeneration 
Instance details

Defined in Amazonka.EC2.Types.InstanceGeneration

Associated Types

type Rep InstanceGeneration :: Type -> Type #

Generic InstanceHealthStatus 
Instance details

Defined in Amazonka.EC2.Types.InstanceHealthStatus

Associated Types

type Rep InstanceHealthStatus :: Type -> Type #

Generic InstanceInterruptionBehavior 
Instance details

Defined in Amazonka.EC2.Types.InstanceInterruptionBehavior

Associated Types

type Rep InstanceInterruptionBehavior :: Type -> Type #

Generic InstanceIpv4Prefix 
Instance details

Defined in Amazonka.EC2.Types.InstanceIpv4Prefix

Associated Types

type Rep InstanceIpv4Prefix :: Type -> Type #

Generic InstanceIpv6Address 
Instance details

Defined in Amazonka.EC2.Types.InstanceIpv6Address

Associated Types

type Rep InstanceIpv6Address :: Type -> Type #

Generic InstanceIpv6AddressRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceIpv6AddressRequest

Associated Types

type Rep InstanceIpv6AddressRequest :: Type -> Type #

Generic InstanceIpv6Prefix 
Instance details

Defined in Amazonka.EC2.Types.InstanceIpv6Prefix

Associated Types

type Rep InstanceIpv6Prefix :: Type -> Type #

Generic InstanceLifecycle 
Instance details

Defined in Amazonka.EC2.Types.InstanceLifecycle

Associated Types

type Rep InstanceLifecycle :: Type -> Type #

Generic InstanceLifecycleType 
Instance details

Defined in Amazonka.EC2.Types.InstanceLifecycleType

Associated Types

type Rep InstanceLifecycleType :: Type -> Type #

Generic InstanceMaintenanceOptions 
Instance details

Defined in Amazonka.EC2.Types.InstanceMaintenanceOptions

Associated Types

type Rep InstanceMaintenanceOptions :: Type -> Type #

Generic InstanceMaintenanceOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceMaintenanceOptionsRequest

Associated Types

type Rep InstanceMaintenanceOptionsRequest :: Type -> Type #

Generic InstanceMarketOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceMarketOptionsRequest

Associated Types

type Rep InstanceMarketOptionsRequest :: Type -> Type #

Generic InstanceMatchCriteria 
Instance details

Defined in Amazonka.EC2.Types.InstanceMatchCriteria

Associated Types

type Rep InstanceMatchCriteria :: Type -> Type #

Generic InstanceMetadataEndpointState 
Instance details

Defined in Amazonka.EC2.Types.InstanceMetadataEndpointState

Associated Types

type Rep InstanceMetadataEndpointState :: Type -> Type #

Generic InstanceMetadataOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceMetadataOptionsRequest

Associated Types

type Rep InstanceMetadataOptionsRequest :: Type -> Type #

Generic InstanceMetadataOptionsResponse 
Instance details

Defined in Amazonka.EC2.Types.InstanceMetadataOptionsResponse

Associated Types

type Rep InstanceMetadataOptionsResponse :: Type -> Type #

Generic InstanceMetadataOptionsState 
Instance details

Defined in Amazonka.EC2.Types.InstanceMetadataOptionsState

Associated Types

type Rep InstanceMetadataOptionsState :: Type -> Type #

Generic InstanceMetadataProtocolState 
Instance details

Defined in Amazonka.EC2.Types.InstanceMetadataProtocolState

Associated Types

type Rep InstanceMetadataProtocolState :: Type -> Type #

Generic InstanceMetadataTagsState 
Instance details

Defined in Amazonka.EC2.Types.InstanceMetadataTagsState

Associated Types

type Rep InstanceMetadataTagsState :: Type -> Type #

Generic InstanceMonitoring 
Instance details

Defined in Amazonka.EC2.Types.InstanceMonitoring

Associated Types

type Rep InstanceMonitoring :: Type -> Type #

Generic InstanceNetworkInterface 
Instance details

Defined in Amazonka.EC2.Types.InstanceNetworkInterface

Associated Types

type Rep InstanceNetworkInterface :: Type -> Type #

Generic InstanceNetworkInterfaceAssociation 
Instance details

Defined in Amazonka.EC2.Types.InstanceNetworkInterfaceAssociation

Generic InstanceNetworkInterfaceAttachment 
Instance details

Defined in Amazonka.EC2.Types.InstanceNetworkInterfaceAttachment

Associated Types

type Rep InstanceNetworkInterfaceAttachment :: Type -> Type #

Generic InstanceNetworkInterfaceSpecification 
Instance details

Defined in Amazonka.EC2.Types.InstanceNetworkInterfaceSpecification

Generic InstancePrivateIpAddress 
Instance details

Defined in Amazonka.EC2.Types.InstancePrivateIpAddress

Associated Types

type Rep InstancePrivateIpAddress :: Type -> Type #

Generic InstanceRequirements 
Instance details

Defined in Amazonka.EC2.Types.InstanceRequirements

Associated Types

type Rep InstanceRequirements :: Type -> Type #

Generic InstanceRequirementsRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceRequirementsRequest

Associated Types

type Rep InstanceRequirementsRequest :: Type -> Type #

Generic InstanceRequirementsWithMetadataRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceRequirementsWithMetadataRequest

Generic InstanceSpecification 
Instance details

Defined in Amazonka.EC2.Types.InstanceSpecification

Associated Types

type Rep InstanceSpecification :: Type -> Type #

Generic InstanceState 
Instance details

Defined in Amazonka.EC2.Types.InstanceState

Associated Types

type Rep InstanceState :: Type -> Type #

Generic InstanceStateChange 
Instance details

Defined in Amazonka.EC2.Types.InstanceStateChange

Associated Types

type Rep InstanceStateChange :: Type -> Type #

Generic InstanceStateName 
Instance details

Defined in Amazonka.EC2.Types.InstanceStateName

Associated Types

type Rep InstanceStateName :: Type -> Type #

Generic InstanceStatus 
Instance details

Defined in Amazonka.EC2.Types.InstanceStatus

Associated Types

type Rep InstanceStatus :: Type -> Type #

Generic InstanceStatusDetails 
Instance details

Defined in Amazonka.EC2.Types.InstanceStatusDetails

Associated Types

type Rep InstanceStatusDetails :: Type -> Type #

Generic InstanceStatusEvent 
Instance details

Defined in Amazonka.EC2.Types.InstanceStatusEvent

Associated Types

type Rep InstanceStatusEvent :: Type -> Type #

Generic InstanceStatusSummary 
Instance details

Defined in Amazonka.EC2.Types.InstanceStatusSummary

Associated Types

type Rep InstanceStatusSummary :: Type -> Type #

Generic InstanceStorageEncryptionSupport 
Instance details

Defined in Amazonka.EC2.Types.InstanceStorageEncryptionSupport

Associated Types

type Rep InstanceStorageEncryptionSupport :: Type -> Type #

Generic InstanceStorageInfo 
Instance details

Defined in Amazonka.EC2.Types.InstanceStorageInfo

Associated Types

type Rep InstanceStorageInfo :: Type -> Type #

Generic InstanceTagNotificationAttribute 
Instance details

Defined in Amazonka.EC2.Types.InstanceTagNotificationAttribute

Associated Types

type Rep InstanceTagNotificationAttribute :: Type -> Type #

Generic InstanceType 
Instance details

Defined in Amazonka.EC2.Types.InstanceType

Associated Types

type Rep InstanceType :: Type -> Type #

Generic InstanceTypeHypervisor 
Instance details

Defined in Amazonka.EC2.Types.InstanceTypeHypervisor

Associated Types

type Rep InstanceTypeHypervisor :: Type -> Type #

Generic InstanceTypeInfo 
Instance details

Defined in Amazonka.EC2.Types.InstanceTypeInfo

Associated Types

type Rep InstanceTypeInfo :: Type -> Type #

Generic InstanceTypeInfoFromInstanceRequirements 
Instance details

Defined in Amazonka.EC2.Types.InstanceTypeInfoFromInstanceRequirements

Generic InstanceTypeOffering 
Instance details

Defined in Amazonka.EC2.Types.InstanceTypeOffering

Associated Types

type Rep InstanceTypeOffering :: Type -> Type #

Generic InstanceUsage 
Instance details

Defined in Amazonka.EC2.Types.InstanceUsage

Associated Types

type Rep InstanceUsage :: Type -> Type #

Generic IntegrateServices 
Instance details

Defined in Amazonka.EC2.Types.IntegrateServices

Associated Types

type Rep IntegrateServices :: Type -> Type #

Generic InterfacePermissionType 
Instance details

Defined in Amazonka.EC2.Types.InterfacePermissionType

Associated Types

type Rep InterfacePermissionType :: Type -> Type #

Generic InterfaceProtocolType 
Instance details

Defined in Amazonka.EC2.Types.InterfaceProtocolType

Associated Types

type Rep InterfaceProtocolType :: Type -> Type #

Generic InternetGateway 
Instance details

Defined in Amazonka.EC2.Types.InternetGateway

Associated Types

type Rep InternetGateway :: Type -> Type #

Generic InternetGatewayAttachment 
Instance details

Defined in Amazonka.EC2.Types.InternetGatewayAttachment

Associated Types

type Rep InternetGatewayAttachment :: Type -> Type #

Generic IpAddressType 
Instance details

Defined in Amazonka.EC2.Types.IpAddressType

Associated Types

type Rep IpAddressType :: Type -> Type #

Generic IpPermission 
Instance details

Defined in Amazonka.EC2.Types.IpPermission

Associated Types

type Rep IpPermission :: Type -> Type #

Generic IpRange 
Instance details

Defined in Amazonka.EC2.Types.IpRange

Associated Types

type Rep IpRange :: Type -> Type #

Methods

from :: IpRange -> Rep IpRange x #

to :: Rep IpRange x -> IpRange #

Generic Ipam 
Instance details

Defined in Amazonka.EC2.Types.Ipam

Associated Types

type Rep Ipam :: Type -> Type #

Methods

from :: Ipam -> Rep Ipam x #

to :: Rep Ipam x -> Ipam #

Generic IpamAddressHistoryRecord 
Instance details

Defined in Amazonka.EC2.Types.IpamAddressHistoryRecord

Associated Types

type Rep IpamAddressHistoryRecord :: Type -> Type #

Generic IpamAddressHistoryResourceType 
Instance details

Defined in Amazonka.EC2.Types.IpamAddressHistoryResourceType

Associated Types

type Rep IpamAddressHistoryResourceType :: Type -> Type #

Generic IpamCidrAuthorizationContext 
Instance details

Defined in Amazonka.EC2.Types.IpamCidrAuthorizationContext

Associated Types

type Rep IpamCidrAuthorizationContext :: Type -> Type #

Generic IpamComplianceStatus 
Instance details

Defined in Amazonka.EC2.Types.IpamComplianceStatus

Associated Types

type Rep IpamComplianceStatus :: Type -> Type #

Generic IpamManagementState 
Instance details

Defined in Amazonka.EC2.Types.IpamManagementState

Associated Types

type Rep IpamManagementState :: Type -> Type #

Generic IpamOperatingRegion 
Instance details

Defined in Amazonka.EC2.Types.IpamOperatingRegion

Associated Types

type Rep IpamOperatingRegion :: Type -> Type #

Generic IpamOverlapStatus 
Instance details

Defined in Amazonka.EC2.Types.IpamOverlapStatus

Associated Types

type Rep IpamOverlapStatus :: Type -> Type #

Generic IpamPool 
Instance details

Defined in Amazonka.EC2.Types.IpamPool

Associated Types

type Rep IpamPool :: Type -> Type #

Methods

from :: IpamPool -> Rep IpamPool x #

to :: Rep IpamPool x -> IpamPool #

Generic IpamPoolAllocation 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolAllocation

Associated Types

type Rep IpamPoolAllocation :: Type -> Type #

Generic IpamPoolAllocationResourceType 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolAllocationResourceType

Associated Types

type Rep IpamPoolAllocationResourceType :: Type -> Type #

Generic IpamPoolAwsService 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolAwsService

Associated Types

type Rep IpamPoolAwsService :: Type -> Type #

Generic IpamPoolCidr 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolCidr

Associated Types

type Rep IpamPoolCidr :: Type -> Type #

Generic IpamPoolCidrFailureCode 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolCidrFailureCode

Associated Types

type Rep IpamPoolCidrFailureCode :: Type -> Type #

Generic IpamPoolCidrFailureReason 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolCidrFailureReason

Associated Types

type Rep IpamPoolCidrFailureReason :: Type -> Type #

Generic IpamPoolCidrState 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolCidrState

Associated Types

type Rep IpamPoolCidrState :: Type -> Type #

Generic IpamPoolState 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolState

Associated Types

type Rep IpamPoolState :: Type -> Type #

Generic IpamResourceCidr 
Instance details

Defined in Amazonka.EC2.Types.IpamResourceCidr

Associated Types

type Rep IpamResourceCidr :: Type -> Type #

Generic IpamResourceTag 
Instance details

Defined in Amazonka.EC2.Types.IpamResourceTag

Associated Types

type Rep IpamResourceTag :: Type -> Type #

Generic IpamResourceType 
Instance details

Defined in Amazonka.EC2.Types.IpamResourceType

Associated Types

type Rep IpamResourceType :: Type -> Type #

Generic IpamScope 
Instance details

Defined in Amazonka.EC2.Types.IpamScope

Associated Types

type Rep IpamScope :: Type -> Type #

Generic IpamScopeState 
Instance details

Defined in Amazonka.EC2.Types.IpamScopeState

Associated Types

type Rep IpamScopeState :: Type -> Type #

Generic IpamScopeType 
Instance details

Defined in Amazonka.EC2.Types.IpamScopeType

Associated Types

type Rep IpamScopeType :: Type -> Type #

Generic IpamState 
Instance details

Defined in Amazonka.EC2.Types.IpamState

Associated Types

type Rep IpamState :: Type -> Type #

Generic Ipv4PrefixSpecification 
Instance details

Defined in Amazonka.EC2.Types.Ipv4PrefixSpecification

Associated Types

type Rep Ipv4PrefixSpecification :: Type -> Type #

Generic Ipv4PrefixSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.Ipv4PrefixSpecificationRequest

Associated Types

type Rep Ipv4PrefixSpecificationRequest :: Type -> Type #

Generic Ipv4PrefixSpecificationResponse 
Instance details

Defined in Amazonka.EC2.Types.Ipv4PrefixSpecificationResponse

Associated Types

type Rep Ipv4PrefixSpecificationResponse :: Type -> Type #

Generic Ipv6CidrAssociation 
Instance details

Defined in Amazonka.EC2.Types.Ipv6CidrAssociation

Associated Types

type Rep Ipv6CidrAssociation :: Type -> Type #

Generic Ipv6CidrBlock 
Instance details

Defined in Amazonka.EC2.Types.Ipv6CidrBlock

Associated Types

type Rep Ipv6CidrBlock :: Type -> Type #

Generic Ipv6Pool 
Instance details

Defined in Amazonka.EC2.Types.Ipv6Pool

Associated Types

type Rep Ipv6Pool :: Type -> Type #

Methods

from :: Ipv6Pool -> Rep Ipv6Pool x #

to :: Rep Ipv6Pool x -> Ipv6Pool #

Generic Ipv6PrefixSpecification 
Instance details

Defined in Amazonka.EC2.Types.Ipv6PrefixSpecification

Associated Types

type Rep Ipv6PrefixSpecification :: Type -> Type #

Generic Ipv6PrefixSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.Ipv6PrefixSpecificationRequest

Associated Types

type Rep Ipv6PrefixSpecificationRequest :: Type -> Type #

Generic Ipv6PrefixSpecificationResponse 
Instance details

Defined in Amazonka.EC2.Types.Ipv6PrefixSpecificationResponse

Associated Types

type Rep Ipv6PrefixSpecificationResponse :: Type -> Type #

Generic Ipv6Range 
Instance details

Defined in Amazonka.EC2.Types.Ipv6Range

Associated Types

type Rep Ipv6Range :: Type -> Type #

Generic Ipv6SupportValue 
Instance details

Defined in Amazonka.EC2.Types.Ipv6SupportValue

Associated Types

type Rep Ipv6SupportValue :: Type -> Type #

Generic KeyFormat 
Instance details

Defined in Amazonka.EC2.Types.KeyFormat

Associated Types

type Rep KeyFormat :: Type -> Type #

Generic KeyPairInfo 
Instance details

Defined in Amazonka.EC2.Types.KeyPairInfo

Associated Types

type Rep KeyPairInfo :: Type -> Type #

Generic KeyType 
Instance details

Defined in Amazonka.EC2.Types.KeyType

Associated Types

type Rep KeyType :: Type -> Type #

Methods

from :: KeyType -> Rep KeyType x #

to :: Rep KeyType x -> KeyType #

Generic LastError 
Instance details

Defined in Amazonka.EC2.Types.LastError

Associated Types

type Rep LastError :: Type -> Type #

Generic LaunchPermission 
Instance details

Defined in Amazonka.EC2.Types.LaunchPermission

Associated Types

type Rep LaunchPermission :: Type -> Type #

Generic LaunchPermissionModifications 
Instance details

Defined in Amazonka.EC2.Types.LaunchPermissionModifications

Associated Types

type Rep LaunchPermissionModifications :: Type -> Type #

Generic LaunchSpecification 
Instance details

Defined in Amazonka.EC2.Types.LaunchSpecification

Associated Types

type Rep LaunchSpecification :: Type -> Type #

Generic LaunchTemplate 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplate

Associated Types

type Rep LaunchTemplate :: Type -> Type #

Generic LaunchTemplateAndOverridesResponse 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateAndOverridesResponse

Associated Types

type Rep LaunchTemplateAndOverridesResponse :: Type -> Type #

Generic LaunchTemplateAutoRecoveryState 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateAutoRecoveryState

Associated Types

type Rep LaunchTemplateAutoRecoveryState :: Type -> Type #

Generic LaunchTemplateBlockDeviceMapping 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateBlockDeviceMapping

Associated Types

type Rep LaunchTemplateBlockDeviceMapping :: Type -> Type #

Generic LaunchTemplateBlockDeviceMappingRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateBlockDeviceMappingRequest

Generic LaunchTemplateCapacityReservationSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateCapacityReservationSpecificationRequest

Generic LaunchTemplateCapacityReservationSpecificationResponse 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateCapacityReservationSpecificationResponse

Generic LaunchTemplateConfig 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateConfig

Associated Types

type Rep LaunchTemplateConfig :: Type -> Type #

Generic LaunchTemplateCpuOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateCpuOptions

Associated Types

type Rep LaunchTemplateCpuOptions :: Type -> Type #

Generic LaunchTemplateCpuOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateCpuOptionsRequest

Associated Types

type Rep LaunchTemplateCpuOptionsRequest :: Type -> Type #

Generic LaunchTemplateEbsBlockDevice 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateEbsBlockDevice

Associated Types

type Rep LaunchTemplateEbsBlockDevice :: Type -> Type #

Generic LaunchTemplateEbsBlockDeviceRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateEbsBlockDeviceRequest

Generic LaunchTemplateElasticInferenceAccelerator 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateElasticInferenceAccelerator

Generic LaunchTemplateElasticInferenceAcceleratorResponse 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateElasticInferenceAcceleratorResponse

Generic LaunchTemplateEnclaveOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateEnclaveOptions

Associated Types

type Rep LaunchTemplateEnclaveOptions :: Type -> Type #

Generic LaunchTemplateEnclaveOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateEnclaveOptionsRequest

Generic LaunchTemplateErrorCode 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateErrorCode

Associated Types

type Rep LaunchTemplateErrorCode :: Type -> Type #

Generic LaunchTemplateHibernationOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateHibernationOptions

Associated Types

type Rep LaunchTemplateHibernationOptions :: Type -> Type #

Generic LaunchTemplateHibernationOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateHibernationOptionsRequest

Generic LaunchTemplateHttpTokensState 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateHttpTokensState

Associated Types

type Rep LaunchTemplateHttpTokensState :: Type -> Type #

Generic LaunchTemplateIamInstanceProfileSpecification 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateIamInstanceProfileSpecification

Generic LaunchTemplateIamInstanceProfileSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateIamInstanceProfileSpecificationRequest

Generic LaunchTemplateInstanceMaintenanceOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMaintenanceOptions

Generic LaunchTemplateInstanceMaintenanceOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMaintenanceOptionsRequest

Generic LaunchTemplateInstanceMarketOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMarketOptions

Generic LaunchTemplateInstanceMarketOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMarketOptionsRequest

Generic LaunchTemplateInstanceMetadataEndpointState 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMetadataEndpointState

Generic LaunchTemplateInstanceMetadataOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMetadataOptions

Generic LaunchTemplateInstanceMetadataOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMetadataOptionsRequest

Generic LaunchTemplateInstanceMetadataOptionsState 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMetadataOptionsState

Generic LaunchTemplateInstanceMetadataProtocolIpv6 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMetadataProtocolIpv6

Generic LaunchTemplateInstanceMetadataTagsState 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMetadataTagsState

Generic LaunchTemplateInstanceNetworkInterfaceSpecification 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceNetworkInterfaceSpecification

Generic LaunchTemplateInstanceNetworkInterfaceSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceNetworkInterfaceSpecificationRequest

Generic LaunchTemplateLicenseConfiguration 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateLicenseConfiguration

Associated Types

type Rep LaunchTemplateLicenseConfiguration :: Type -> Type #

Generic LaunchTemplateLicenseConfigurationRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateLicenseConfigurationRequest

Generic LaunchTemplateOverrides 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateOverrides

Associated Types

type Rep LaunchTemplateOverrides :: Type -> Type #

Generic LaunchTemplatePlacement 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplatePlacement

Associated Types

type Rep LaunchTemplatePlacement :: Type -> Type #

Generic LaunchTemplatePlacementRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplatePlacementRequest

Associated Types

type Rep LaunchTemplatePlacementRequest :: Type -> Type #

Generic LaunchTemplatePrivateDnsNameOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplatePrivateDnsNameOptions

Generic LaunchTemplatePrivateDnsNameOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplatePrivateDnsNameOptionsRequest

Generic LaunchTemplateSpecification 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateSpecification

Associated Types

type Rep LaunchTemplateSpecification :: Type -> Type #

Generic LaunchTemplateSpotMarketOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateSpotMarketOptions

Associated Types

type Rep LaunchTemplateSpotMarketOptions :: Type -> Type #

Generic LaunchTemplateSpotMarketOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateSpotMarketOptionsRequest

Generic LaunchTemplateTagSpecification 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateTagSpecification

Associated Types

type Rep LaunchTemplateTagSpecification :: Type -> Type #

Generic LaunchTemplateTagSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateTagSpecificationRequest

Generic LaunchTemplateVersion 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateVersion

Associated Types

type Rep LaunchTemplateVersion :: Type -> Type #

Generic LaunchTemplatesMonitoring 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplatesMonitoring

Associated Types

type Rep LaunchTemplatesMonitoring :: Type -> Type #

Generic LaunchTemplatesMonitoringRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplatesMonitoringRequest

Associated Types

type Rep LaunchTemplatesMonitoringRequest :: Type -> Type #

Generic LicenseConfiguration 
Instance details

Defined in Amazonka.EC2.Types.LicenseConfiguration

Associated Types

type Rep LicenseConfiguration :: Type -> Type #

Generic LicenseConfigurationRequest 
Instance details

Defined in Amazonka.EC2.Types.LicenseConfigurationRequest

Associated Types

type Rep LicenseConfigurationRequest :: Type -> Type #

Generic ListingState 
Instance details

Defined in Amazonka.EC2.Types.ListingState

Associated Types

type Rep ListingState :: Type -> Type #

Generic ListingStatus 
Instance details

Defined in Amazonka.EC2.Types.ListingStatus

Associated Types

type Rep ListingStatus :: Type -> Type #

Generic LoadBalancersConfig 
Instance details

Defined in Amazonka.EC2.Types.LoadBalancersConfig

Associated Types

type Rep LoadBalancersConfig :: Type -> Type #

Generic LoadPermission 
Instance details

Defined in Amazonka.EC2.Types.LoadPermission

Associated Types

type Rep LoadPermission :: Type -> Type #

Generic LoadPermissionModifications 
Instance details

Defined in Amazonka.EC2.Types.LoadPermissionModifications

Associated Types

type Rep LoadPermissionModifications :: Type -> Type #

Generic LoadPermissionRequest 
Instance details

Defined in Amazonka.EC2.Types.LoadPermissionRequest

Associated Types

type Rep LoadPermissionRequest :: Type -> Type #

Generic LocalGateway 
Instance details

Defined in Amazonka.EC2.Types.LocalGateway

Associated Types

type Rep LocalGateway :: Type -> Type #

Generic LocalGatewayRoute 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRoute

Associated Types

type Rep LocalGatewayRoute :: Type -> Type #

Generic LocalGatewayRouteState 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRouteState

Associated Types

type Rep LocalGatewayRouteState :: Type -> Type #

Generic LocalGatewayRouteTable 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRouteTable

Associated Types

type Rep LocalGatewayRouteTable :: Type -> Type #

Generic LocalGatewayRouteTableMode 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRouteTableMode

Associated Types

type Rep LocalGatewayRouteTableMode :: Type -> Type #

Generic LocalGatewayRouteTableVirtualInterfaceGroupAssociation 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRouteTableVirtualInterfaceGroupAssociation

Generic LocalGatewayRouteTableVpcAssociation 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRouteTableVpcAssociation

Generic LocalGatewayRouteType 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRouteType

Associated Types

type Rep LocalGatewayRouteType :: Type -> Type #

Generic LocalGatewayVirtualInterface 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayVirtualInterface

Associated Types

type Rep LocalGatewayVirtualInterface :: Type -> Type #

Generic LocalGatewayVirtualInterfaceGroup 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayVirtualInterfaceGroup

Associated Types

type Rep LocalGatewayVirtualInterfaceGroup :: Type -> Type #

Generic LocalStorage 
Instance details

Defined in Amazonka.EC2.Types.LocalStorage

Associated Types

type Rep LocalStorage :: Type -> Type #

Generic LocalStorageType 
Instance details

Defined in Amazonka.EC2.Types.LocalStorageType

Associated Types

type Rep LocalStorageType :: Type -> Type #

Generic LocationType 
Instance details

Defined in Amazonka.EC2.Types.LocationType

Associated Types

type Rep LocationType :: Type -> Type #

Generic LogDestinationType 
Instance details

Defined in Amazonka.EC2.Types.LogDestinationType

Associated Types

type Rep LogDestinationType :: Type -> Type #

Generic ManagedPrefixList 
Instance details

Defined in Amazonka.EC2.Types.ManagedPrefixList

Associated Types

type Rep ManagedPrefixList :: Type -> Type #

Generic MarketType 
Instance details

Defined in Amazonka.EC2.Types.MarketType

Associated Types

type Rep MarketType :: Type -> Type #

Generic MembershipType 
Instance details

Defined in Amazonka.EC2.Types.MembershipType

Associated Types

type Rep MembershipType :: Type -> Type #

Generic MemoryGiBPerVCpu 
Instance details

Defined in Amazonka.EC2.Types.MemoryGiBPerVCpu

Associated Types

type Rep MemoryGiBPerVCpu :: Type -> Type #

Generic MemoryGiBPerVCpuRequest 
Instance details

Defined in Amazonka.EC2.Types.MemoryGiBPerVCpuRequest

Associated Types

type Rep MemoryGiBPerVCpuRequest :: Type -> Type #

Generic MemoryInfo 
Instance details

Defined in Amazonka.EC2.Types.MemoryInfo

Associated Types

type Rep MemoryInfo :: Type -> Type #

Generic MemoryMiB 
Instance details

Defined in Amazonka.EC2.Types.MemoryMiB

Associated Types

type Rep MemoryMiB :: Type -> Type #

Generic MemoryMiBRequest 
Instance details

Defined in Amazonka.EC2.Types.MemoryMiBRequest

Associated Types

type Rep MemoryMiBRequest :: Type -> Type #

Generic MetricPoint 
Instance details

Defined in Amazonka.EC2.Types.MetricPoint

Associated Types

type Rep MetricPoint :: Type -> Type #

Generic MetricType 
Instance details

Defined in Amazonka.EC2.Types.MetricType

Associated Types

type Rep MetricType :: Type -> Type #

Generic ModifyAvailabilityZoneOptInStatus 
Instance details

Defined in Amazonka.EC2.Types.ModifyAvailabilityZoneOptInStatus

Associated Types

type Rep ModifyAvailabilityZoneOptInStatus :: Type -> Type #

Generic ModifyTransitGatewayOptions 
Instance details

Defined in Amazonka.EC2.Types.ModifyTransitGatewayOptions

Associated Types

type Rep ModifyTransitGatewayOptions :: Type -> Type #

Generic ModifyTransitGatewayVpcAttachmentRequestOptions 
Instance details

Defined in Amazonka.EC2.Types.ModifyTransitGatewayVpcAttachmentRequestOptions

Generic ModifyVerifiedAccessEndpointEniOptions 
Instance details

Defined in Amazonka.EC2.Types.ModifyVerifiedAccessEndpointEniOptions

Generic ModifyVerifiedAccessEndpointLoadBalancerOptions 
Instance details

Defined in Amazonka.EC2.Types.ModifyVerifiedAccessEndpointLoadBalancerOptions

Generic ModifyVerifiedAccessTrustProviderOidcOptions 
Instance details

Defined in Amazonka.EC2.Types.ModifyVerifiedAccessTrustProviderOidcOptions

Generic ModifyVpnTunnelOptionsSpecification 
Instance details

Defined in Amazonka.EC2.Types.ModifyVpnTunnelOptionsSpecification

Generic Monitoring 
Instance details

Defined in Amazonka.EC2.Types.Monitoring

Associated Types

type Rep Monitoring :: Type -> Type #

Generic MonitoringState 
Instance details

Defined in Amazonka.EC2.Types.MonitoringState

Associated Types

type Rep MonitoringState :: Type -> Type #

Generic MoveStatus 
Instance details

Defined in Amazonka.EC2.Types.MoveStatus

Associated Types

type Rep MoveStatus :: Type -> Type #

Generic MovingAddressStatus 
Instance details

Defined in Amazonka.EC2.Types.MovingAddressStatus

Associated Types

type Rep MovingAddressStatus :: Type -> Type #

Generic MulticastSupportValue 
Instance details

Defined in Amazonka.EC2.Types.MulticastSupportValue

Associated Types

type Rep MulticastSupportValue :: Type -> Type #

Generic NatGateway 
Instance details

Defined in Amazonka.EC2.Types.NatGateway

Associated Types

type Rep NatGateway :: Type -> Type #

Generic NatGatewayAddress 
Instance details

Defined in Amazonka.EC2.Types.NatGatewayAddress

Associated Types

type Rep NatGatewayAddress :: Type -> Type #

Generic NatGatewayState 
Instance details

Defined in Amazonka.EC2.Types.NatGatewayState

Associated Types

type Rep NatGatewayState :: Type -> Type #

Generic NetworkAcl 
Instance details

Defined in Amazonka.EC2.Types.NetworkAcl

Associated Types

type Rep NetworkAcl :: Type -> Type #

Generic NetworkAclAssociation 
Instance details

Defined in Amazonka.EC2.Types.NetworkAclAssociation

Associated Types

type Rep NetworkAclAssociation :: Type -> Type #

Generic NetworkAclEntry 
Instance details

Defined in Amazonka.EC2.Types.NetworkAclEntry

Associated Types

type Rep NetworkAclEntry :: Type -> Type #

Generic NetworkBandwidthGbps 
Instance details

Defined in Amazonka.EC2.Types.NetworkBandwidthGbps

Associated Types

type Rep NetworkBandwidthGbps :: Type -> Type #

Generic NetworkBandwidthGbpsRequest 
Instance details

Defined in Amazonka.EC2.Types.NetworkBandwidthGbpsRequest

Associated Types

type Rep NetworkBandwidthGbpsRequest :: Type -> Type #

Generic NetworkCardInfo 
Instance details

Defined in Amazonka.EC2.Types.NetworkCardInfo

Associated Types

type Rep NetworkCardInfo :: Type -> Type #

Generic NetworkInfo 
Instance details

Defined in Amazonka.EC2.Types.NetworkInfo

Associated Types

type Rep NetworkInfo :: Type -> Type #

Generic NetworkInsightsAccessScope 
Instance details

Defined in Amazonka.EC2.Types.NetworkInsightsAccessScope

Associated Types

type Rep NetworkInsightsAccessScope :: Type -> Type #

Generic NetworkInsightsAccessScopeAnalysis 
Instance details

Defined in Amazonka.EC2.Types.NetworkInsightsAccessScopeAnalysis

Associated Types

type Rep NetworkInsightsAccessScopeAnalysis :: Type -> Type #

Generic NetworkInsightsAccessScopeContent 
Instance details

Defined in Amazonka.EC2.Types.NetworkInsightsAccessScopeContent

Associated Types

type Rep NetworkInsightsAccessScopeContent :: Type -> Type #

Generic NetworkInsightsAnalysis 
Instance details

Defined in Amazonka.EC2.Types.NetworkInsightsAnalysis

Associated Types

type Rep NetworkInsightsAnalysis :: Type -> Type #

Generic NetworkInsightsPath 
Instance details

Defined in Amazonka.EC2.Types.NetworkInsightsPath

Associated Types

type Rep NetworkInsightsPath :: Type -> Type #

Generic NetworkInterface 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterface

Associated Types

type Rep NetworkInterface :: Type -> Type #

Generic NetworkInterfaceAssociation 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceAssociation

Associated Types

type Rep NetworkInterfaceAssociation :: Type -> Type #

Generic NetworkInterfaceAttachment 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceAttachment

Associated Types

type Rep NetworkInterfaceAttachment :: Type -> Type #

Generic NetworkInterfaceAttachmentChanges 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceAttachmentChanges

Associated Types

type Rep NetworkInterfaceAttachmentChanges :: Type -> Type #

Generic NetworkInterfaceAttribute 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceAttribute

Associated Types

type Rep NetworkInterfaceAttribute :: Type -> Type #

Generic NetworkInterfaceCount 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceCount

Associated Types

type Rep NetworkInterfaceCount :: Type -> Type #

Generic NetworkInterfaceCountRequest 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceCountRequest

Associated Types

type Rep NetworkInterfaceCountRequest :: Type -> Type #

Generic NetworkInterfaceCreationType 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceCreationType

Associated Types

type Rep NetworkInterfaceCreationType :: Type -> Type #

Generic NetworkInterfaceIpv6Address 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceIpv6Address

Associated Types

type Rep NetworkInterfaceIpv6Address :: Type -> Type #

Generic NetworkInterfacePermission 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfacePermission

Associated Types

type Rep NetworkInterfacePermission :: Type -> Type #

Generic NetworkInterfacePermissionState 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfacePermissionState

Associated Types

type Rep NetworkInterfacePermissionState :: Type -> Type #

Generic NetworkInterfacePermissionStateCode 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfacePermissionStateCode

Generic NetworkInterfacePrivateIpAddress 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfacePrivateIpAddress

Associated Types

type Rep NetworkInterfacePrivateIpAddress :: Type -> Type #

Generic NetworkInterfaceStatus 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceStatus

Associated Types

type Rep NetworkInterfaceStatus :: Type -> Type #

Generic NetworkInterfaceType 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceType

Associated Types

type Rep NetworkInterfaceType :: Type -> Type #

Generic NewDhcpConfiguration 
Instance details

Defined in Amazonka.EC2.Types.NewDhcpConfiguration

Associated Types

type Rep NewDhcpConfiguration :: Type -> Type #

Generic OfferingClassType 
Instance details

Defined in Amazonka.EC2.Types.OfferingClassType

Associated Types

type Rep OfferingClassType :: Type -> Type #

Generic OfferingTypeValues 
Instance details

Defined in Amazonka.EC2.Types.OfferingTypeValues

Associated Types

type Rep OfferingTypeValues :: Type -> Type #

Generic OidcOptions 
Instance details

Defined in Amazonka.EC2.Types.OidcOptions

Associated Types

type Rep OidcOptions :: Type -> Type #

Generic OnDemandAllocationStrategy 
Instance details

Defined in Amazonka.EC2.Types.OnDemandAllocationStrategy

Associated Types

type Rep OnDemandAllocationStrategy :: Type -> Type #

Generic OnDemandOptions 
Instance details

Defined in Amazonka.EC2.Types.OnDemandOptions

Associated Types

type Rep OnDemandOptions :: Type -> Type #

Generic OnDemandOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.OnDemandOptionsRequest

Associated Types

type Rep OnDemandOptionsRequest :: Type -> Type #

Generic OperationType 
Instance details

Defined in Amazonka.EC2.Types.OperationType

Associated Types

type Rep OperationType :: Type -> Type #

Generic PacketHeaderStatement 
Instance details

Defined in Amazonka.EC2.Types.PacketHeaderStatement

Associated Types

type Rep PacketHeaderStatement :: Type -> Type #

Generic PacketHeaderStatementRequest 
Instance details

Defined in Amazonka.EC2.Types.PacketHeaderStatementRequest

Associated Types

type Rep PacketHeaderStatementRequest :: Type -> Type #

Generic PartitionLoadFrequency 
Instance details

Defined in Amazonka.EC2.Types.PartitionLoadFrequency

Associated Types

type Rep PartitionLoadFrequency :: Type -> Type #

Generic PathComponent 
Instance details

Defined in Amazonka.EC2.Types.PathComponent

Associated Types

type Rep PathComponent :: Type -> Type #

Generic PathStatement 
Instance details

Defined in Amazonka.EC2.Types.PathStatement

Associated Types

type Rep PathStatement :: Type -> Type #

Generic PathStatementRequest 
Instance details

Defined in Amazonka.EC2.Types.PathStatementRequest

Associated Types

type Rep PathStatementRequest :: Type -> Type #

Generic PayerResponsibility 
Instance details

Defined in Amazonka.EC2.Types.PayerResponsibility

Associated Types

type Rep PayerResponsibility :: Type -> Type #

Generic PaymentOption 
Instance details

Defined in Amazonka.EC2.Types.PaymentOption

Associated Types

type Rep PaymentOption :: Type -> Type #

Generic PciId 
Instance details

Defined in Amazonka.EC2.Types.PciId

Associated Types

type Rep PciId :: Type -> Type #

Methods

from :: PciId -> Rep PciId x #

to :: Rep PciId x -> PciId #

Generic PeeringAttachmentStatus 
Instance details

Defined in Amazonka.EC2.Types.PeeringAttachmentStatus

Associated Types

type Rep PeeringAttachmentStatus :: Type -> Type #

Generic PeeringConnectionOptions 
Instance details

Defined in Amazonka.EC2.Types.PeeringConnectionOptions

Associated Types

type Rep PeeringConnectionOptions :: Type -> Type #

Generic PeeringConnectionOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.PeeringConnectionOptionsRequest

Associated Types

type Rep PeeringConnectionOptionsRequest :: Type -> Type #

Generic PeeringTgwInfo 
Instance details

Defined in Amazonka.EC2.Types.PeeringTgwInfo

Associated Types

type Rep PeeringTgwInfo :: Type -> Type #

Generic PeriodType 
Instance details

Defined in Amazonka.EC2.Types.PeriodType

Associated Types

type Rep PeriodType :: Type -> Type #

Generic PermissionGroup 
Instance details

Defined in Amazonka.EC2.Types.PermissionGroup

Associated Types

type Rep PermissionGroup :: Type -> Type #

Generic Phase1DHGroupNumbersListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase1DHGroupNumbersListValue

Associated Types

type Rep Phase1DHGroupNumbersListValue :: Type -> Type #

Generic Phase1DHGroupNumbersRequestListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase1DHGroupNumbersRequestListValue

Generic Phase1EncryptionAlgorithmsListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase1EncryptionAlgorithmsListValue

Generic Phase1EncryptionAlgorithmsRequestListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase1EncryptionAlgorithmsRequestListValue

Generic Phase1IntegrityAlgorithmsListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase1IntegrityAlgorithmsListValue

Associated Types

type Rep Phase1IntegrityAlgorithmsListValue :: Type -> Type #

Generic Phase1IntegrityAlgorithmsRequestListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase1IntegrityAlgorithmsRequestListValue

Generic Phase2DHGroupNumbersListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase2DHGroupNumbersListValue

Associated Types

type Rep Phase2DHGroupNumbersListValue :: Type -> Type #

Generic Phase2DHGroupNumbersRequestListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase2DHGroupNumbersRequestListValue

Generic Phase2EncryptionAlgorithmsListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase2EncryptionAlgorithmsListValue

Generic Phase2EncryptionAlgorithmsRequestListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase2EncryptionAlgorithmsRequestListValue

Generic Phase2IntegrityAlgorithmsListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase2IntegrityAlgorithmsListValue

Associated Types

type Rep Phase2IntegrityAlgorithmsListValue :: Type -> Type #

Generic Phase2IntegrityAlgorithmsRequestListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase2IntegrityAlgorithmsRequestListValue

Generic Placement 
Instance details

Defined in Amazonka.EC2.Types.Placement

Associated Types

type Rep Placement :: Type -> Type #

Generic PlacementGroup 
Instance details

Defined in Amazonka.EC2.Types.PlacementGroup

Associated Types

type Rep PlacementGroup :: Type -> Type #

Generic PlacementGroupInfo 
Instance details

Defined in Amazonka.EC2.Types.PlacementGroupInfo

Associated Types

type Rep PlacementGroupInfo :: Type -> Type #

Generic PlacementGroupState 
Instance details

Defined in Amazonka.EC2.Types.PlacementGroupState

Associated Types

type Rep PlacementGroupState :: Type -> Type #

Generic PlacementGroupStrategy 
Instance details

Defined in Amazonka.EC2.Types.PlacementGroupStrategy

Associated Types

type Rep PlacementGroupStrategy :: Type -> Type #

Generic PlacementResponse 
Instance details

Defined in Amazonka.EC2.Types.PlacementResponse

Associated Types

type Rep PlacementResponse :: Type -> Type #

Generic PlacementStrategy 
Instance details

Defined in Amazonka.EC2.Types.PlacementStrategy

Associated Types

type Rep PlacementStrategy :: Type -> Type #

Generic PlatformValues 
Instance details

Defined in Amazonka.EC2.Types.PlatformValues

Associated Types

type Rep PlatformValues :: Type -> Type #

Generic PoolCidrBlock 
Instance details

Defined in Amazonka.EC2.Types.PoolCidrBlock

Associated Types

type Rep PoolCidrBlock :: Type -> Type #

Generic PortRange 
Instance details

Defined in Amazonka.EC2.Types.PortRange

Associated Types

type Rep PortRange :: Type -> Type #

Generic PrefixList 
Instance details

Defined in Amazonka.EC2.Types.PrefixList

Associated Types

type Rep PrefixList :: Type -> Type #

Generic PrefixListAssociation 
Instance details

Defined in Amazonka.EC2.Types.PrefixListAssociation

Associated Types

type Rep PrefixListAssociation :: Type -> Type #

Generic PrefixListEntry 
Instance details

Defined in Amazonka.EC2.Types.PrefixListEntry

Associated Types

type Rep PrefixListEntry :: Type -> Type #

Generic PrefixListId 
Instance details

Defined in Amazonka.EC2.Types.PrefixListId

Associated Types

type Rep PrefixListId :: Type -> Type #

Generic PrefixListState 
Instance details

Defined in Amazonka.EC2.Types.PrefixListState

Associated Types

type Rep PrefixListState :: Type -> Type #

Generic PriceSchedule 
Instance details

Defined in Amazonka.EC2.Types.PriceSchedule

Associated Types

type Rep PriceSchedule :: Type -> Type #

Generic PriceScheduleSpecification 
Instance details

Defined in Amazonka.EC2.Types.PriceScheduleSpecification

Associated Types

type Rep PriceScheduleSpecification :: Type -> Type #

Generic PricingDetail 
Instance details

Defined in Amazonka.EC2.Types.PricingDetail

Associated Types

type Rep PricingDetail :: Type -> Type #

Generic PrincipalIdFormat 
Instance details

Defined in Amazonka.EC2.Types.PrincipalIdFormat

Associated Types

type Rep PrincipalIdFormat :: Type -> Type #

Generic PrincipalType 
Instance details

Defined in Amazonka.EC2.Types.PrincipalType

Associated Types

type Rep PrincipalType :: Type -> Type #

Generic PrivateDnsDetails 
Instance details

Defined in Amazonka.EC2.Types.PrivateDnsDetails

Associated Types

type Rep PrivateDnsDetails :: Type -> Type #

Generic PrivateDnsNameConfiguration 
Instance details

Defined in Amazonka.EC2.Types.PrivateDnsNameConfiguration

Associated Types

type Rep PrivateDnsNameConfiguration :: Type -> Type #

Generic PrivateDnsNameOptionsOnLaunch 
Instance details

Defined in Amazonka.EC2.Types.PrivateDnsNameOptionsOnLaunch

Associated Types

type Rep PrivateDnsNameOptionsOnLaunch :: Type -> Type #

Generic PrivateDnsNameOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.PrivateDnsNameOptionsRequest

Associated Types

type Rep PrivateDnsNameOptionsRequest :: Type -> Type #

Generic PrivateDnsNameOptionsResponse 
Instance details

Defined in Amazonka.EC2.Types.PrivateDnsNameOptionsResponse

Associated Types

type Rep PrivateDnsNameOptionsResponse :: Type -> Type #

Generic PrivateIpAddressSpecification 
Instance details

Defined in Amazonka.EC2.Types.PrivateIpAddressSpecification

Associated Types

type Rep PrivateIpAddressSpecification :: Type -> Type #

Generic ProcessorInfo 
Instance details

Defined in Amazonka.EC2.Types.ProcessorInfo

Associated Types

type Rep ProcessorInfo :: Type -> Type #

Generic ProductCode 
Instance details

Defined in Amazonka.EC2.Types.ProductCode

Associated Types

type Rep ProductCode :: Type -> Type #

Generic ProductCodeValues 
Instance details

Defined in Amazonka.EC2.Types.ProductCodeValues

Associated Types

type Rep ProductCodeValues :: Type -> Type #

Generic PropagatingVgw 
Instance details

Defined in Amazonka.EC2.Types.PropagatingVgw

Associated Types

type Rep PropagatingVgw :: Type -> Type #

Generic Protocol 
Instance details

Defined in Amazonka.EC2.Types.Protocol

Associated Types

type Rep Protocol :: Type -> Type #

Methods

from :: Protocol -> Rep Protocol x #

to :: Rep Protocol x -> Protocol #

Generic ProtocolValue 
Instance details

Defined in Amazonka.EC2.Types.ProtocolValue

Associated Types

type Rep ProtocolValue :: Type -> Type #

Generic ProvisionedBandwidth 
Instance details

Defined in Amazonka.EC2.Types.ProvisionedBandwidth

Associated Types

type Rep ProvisionedBandwidth :: Type -> Type #

Generic PtrUpdateStatus 
Instance details

Defined in Amazonka.EC2.Types.PtrUpdateStatus

Associated Types

type Rep PtrUpdateStatus :: Type -> Type #

Generic PublicIpv4Pool 
Instance details

Defined in Amazonka.EC2.Types.PublicIpv4Pool

Associated Types

type Rep PublicIpv4Pool :: Type -> Type #

Generic PublicIpv4PoolRange 
Instance details

Defined in Amazonka.EC2.Types.PublicIpv4PoolRange

Associated Types

type Rep PublicIpv4PoolRange :: Type -> Type #

Generic Purchase 
Instance details

Defined in Amazonka.EC2.Types.Purchase

Associated Types

type Rep Purchase :: Type -> Type #

Methods

from :: Purchase -> Rep Purchase x #

to :: Rep Purchase x -> Purchase #

Generic PurchaseRequest 
Instance details

Defined in Amazonka.EC2.Types.PurchaseRequest

Associated Types

type Rep PurchaseRequest :: Type -> Type #

Generic RIProductDescription 
Instance details

Defined in Amazonka.EC2.Types.RIProductDescription

Associated Types

type Rep RIProductDescription :: Type -> Type #

Generic RecurringCharge 
Instance details

Defined in Amazonka.EC2.Types.RecurringCharge

Associated Types

type Rep RecurringCharge :: Type -> Type #

Generic RecurringChargeFrequency 
Instance details

Defined in Amazonka.EC2.Types.RecurringChargeFrequency

Associated Types

type Rep RecurringChargeFrequency :: Type -> Type #

Generic ReferencedSecurityGroup 
Instance details

Defined in Amazonka.EC2.Types.ReferencedSecurityGroup

Associated Types

type Rep ReferencedSecurityGroup :: Type -> Type #

Generic RegionInfo 
Instance details

Defined in Amazonka.EC2.Types.RegionInfo

Associated Types

type Rep RegionInfo :: Type -> Type #

Generic RegisterInstanceTagAttributeRequest 
Instance details

Defined in Amazonka.EC2.Types.RegisterInstanceTagAttributeRequest

Generic RemoveIpamOperatingRegion 
Instance details

Defined in Amazonka.EC2.Types.RemoveIpamOperatingRegion

Associated Types

type Rep RemoveIpamOperatingRegion :: Type -> Type #

Generic RemovePrefixListEntry 
Instance details

Defined in Amazonka.EC2.Types.RemovePrefixListEntry

Associated Types

type Rep RemovePrefixListEntry :: Type -> Type #

Generic ReplaceRootVolumeTask 
Instance details

Defined in Amazonka.EC2.Types.ReplaceRootVolumeTask

Associated Types

type Rep ReplaceRootVolumeTask :: Type -> Type #

Generic ReplaceRootVolumeTaskState 
Instance details

Defined in Amazonka.EC2.Types.ReplaceRootVolumeTaskState

Associated Types

type Rep ReplaceRootVolumeTaskState :: Type -> Type #

Generic ReplacementStrategy 
Instance details

Defined in Amazonka.EC2.Types.ReplacementStrategy

Associated Types

type Rep ReplacementStrategy :: Type -> Type #

Generic ReportInstanceReasonCodes 
Instance details

Defined in Amazonka.EC2.Types.ReportInstanceReasonCodes

Associated Types

type Rep ReportInstanceReasonCodes :: Type -> Type #

Generic ReportStatusType 
Instance details

Defined in Amazonka.EC2.Types.ReportStatusType

Associated Types

type Rep ReportStatusType :: Type -> Type #

Generic RequestIpamResourceTag 
Instance details

Defined in Amazonka.EC2.Types.RequestIpamResourceTag

Associated Types

type Rep RequestIpamResourceTag :: Type -> Type #

Generic RequestLaunchTemplateData 
Instance details

Defined in Amazonka.EC2.Types.RequestLaunchTemplateData

Associated Types

type Rep RequestLaunchTemplateData :: Type -> Type #

Generic RequestSpotLaunchSpecification 
Instance details

Defined in Amazonka.EC2.Types.RequestSpotLaunchSpecification

Associated Types

type Rep RequestSpotLaunchSpecification :: Type -> Type #

Generic Reservation 
Instance details

Defined in Amazonka.EC2.Types.Reservation

Associated Types

type Rep Reservation :: Type -> Type #

Generic ReservationFleetInstanceSpecification 
Instance details

Defined in Amazonka.EC2.Types.ReservationFleetInstanceSpecification

Generic ReservationState 
Instance details

Defined in Amazonka.EC2.Types.ReservationState

Associated Types

type Rep ReservationState :: Type -> Type #

Generic ReservationValue 
Instance details

Defined in Amazonka.EC2.Types.ReservationValue

Associated Types

type Rep ReservationValue :: Type -> Type #

Generic ReservedInstanceLimitPrice 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstanceLimitPrice

Associated Types

type Rep ReservedInstanceLimitPrice :: Type -> Type #

Generic ReservedInstanceReservationValue 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstanceReservationValue

Associated Types

type Rep ReservedInstanceReservationValue :: Type -> Type #

Generic ReservedInstanceState 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstanceState

Associated Types

type Rep ReservedInstanceState :: Type -> Type #

Generic ReservedInstances 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstances

Associated Types

type Rep ReservedInstances :: Type -> Type #

Generic ReservedInstancesConfiguration 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstancesConfiguration

Associated Types

type Rep ReservedInstancesConfiguration :: Type -> Type #

Generic ReservedInstancesId 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstancesId

Associated Types

type Rep ReservedInstancesId :: Type -> Type #

Generic ReservedInstancesListing 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstancesListing

Associated Types

type Rep ReservedInstancesListing :: Type -> Type #

Generic ReservedInstancesModification 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstancesModification

Associated Types

type Rep ReservedInstancesModification :: Type -> Type #

Generic ReservedInstancesModificationResult 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstancesModificationResult

Generic ReservedInstancesOffering 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstancesOffering

Associated Types

type Rep ReservedInstancesOffering :: Type -> Type #

Generic ResetFpgaImageAttributeName 
Instance details

Defined in Amazonka.EC2.Types.ResetFpgaImageAttributeName

Associated Types

type Rep ResetFpgaImageAttributeName :: Type -> Type #

Generic ResetImageAttributeName 
Instance details

Defined in Amazonka.EC2.Types.ResetImageAttributeName

Associated Types

type Rep ResetImageAttributeName :: Type -> Type #

Generic ResourceStatement 
Instance details

Defined in Amazonka.EC2.Types.ResourceStatement

Associated Types

type Rep ResourceStatement :: Type -> Type #

Generic ResourceStatementRequest 
Instance details

Defined in Amazonka.EC2.Types.ResourceStatementRequest

Associated Types

type Rep ResourceStatementRequest :: Type -> Type #

Generic ResourceType 
Instance details

Defined in Amazonka.EC2.Types.ResourceType

Associated Types

type Rep ResourceType :: Type -> Type #

Generic ResponseError 
Instance details

Defined in Amazonka.EC2.Types.ResponseError

Associated Types

type Rep ResponseError :: Type -> Type #

Generic ResponseLaunchTemplateData 
Instance details

Defined in Amazonka.EC2.Types.ResponseLaunchTemplateData

Associated Types

type Rep ResponseLaunchTemplateData :: Type -> Type #

Generic RootDeviceType 
Instance details

Defined in Amazonka.EC2.Types.RootDeviceType

Associated Types

type Rep RootDeviceType :: Type -> Type #

Generic Route 
Instance details

Defined in Amazonka.EC2.Types.Route

Associated Types

type Rep Route :: Type -> Type #

Methods

from :: Route -> Rep Route x #

to :: Rep Route x -> Route #

Generic RouteOrigin 
Instance details

Defined in Amazonka.EC2.Types.RouteOrigin

Associated Types

type Rep RouteOrigin :: Type -> Type #

Generic RouteState 
Instance details

Defined in Amazonka.EC2.Types.RouteState

Associated Types

type Rep RouteState :: Type -> Type #

Generic RouteTable 
Instance details

Defined in Amazonka.EC2.Types.RouteTable

Associated Types

type Rep RouteTable :: Type -> Type #

Generic RouteTableAssociation 
Instance details

Defined in Amazonka.EC2.Types.RouteTableAssociation

Associated Types

type Rep RouteTableAssociation :: Type -> Type #

Generic RouteTableAssociationState 
Instance details

Defined in Amazonka.EC2.Types.RouteTableAssociationState

Associated Types

type Rep RouteTableAssociationState :: Type -> Type #

Generic RouteTableAssociationStateCode 
Instance details

Defined in Amazonka.EC2.Types.RouteTableAssociationStateCode

Associated Types

type Rep RouteTableAssociationStateCode :: Type -> Type #

Generic RuleAction 
Instance details

Defined in Amazonka.EC2.Types.RuleAction

Associated Types

type Rep RuleAction :: Type -> Type #

Generic RunInstancesMonitoringEnabled 
Instance details

Defined in Amazonka.EC2.Types.RunInstancesMonitoringEnabled

Associated Types

type Rep RunInstancesMonitoringEnabled :: Type -> Type #

Generic S3ObjectTag 
Instance details

Defined in Amazonka.EC2.Types.S3ObjectTag

Associated Types

type Rep S3ObjectTag :: Type -> Type #

Generic S3Storage 
Instance details

Defined in Amazonka.EC2.Types.S3Storage

Associated Types

type Rep S3Storage :: Type -> Type #

Generic ScheduledInstance 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstance

Associated Types

type Rep ScheduledInstance :: Type -> Type #

Generic ScheduledInstanceAvailability 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstanceAvailability

Associated Types

type Rep ScheduledInstanceAvailability :: Type -> Type #

Generic ScheduledInstanceRecurrence 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstanceRecurrence

Associated Types

type Rep ScheduledInstanceRecurrence :: Type -> Type #

Generic ScheduledInstanceRecurrenceRequest 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstanceRecurrenceRequest

Associated Types

type Rep ScheduledInstanceRecurrenceRequest :: Type -> Type #

Generic ScheduledInstancesBlockDeviceMapping 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesBlockDeviceMapping

Generic ScheduledInstancesEbs 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesEbs

Associated Types

type Rep ScheduledInstancesEbs :: Type -> Type #

Generic ScheduledInstancesIamInstanceProfile 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesIamInstanceProfile

Generic ScheduledInstancesIpv6Address 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesIpv6Address

Associated Types

type Rep ScheduledInstancesIpv6Address :: Type -> Type #

Generic ScheduledInstancesLaunchSpecification 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesLaunchSpecification

Generic ScheduledInstancesMonitoring 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesMonitoring

Associated Types

type Rep ScheduledInstancesMonitoring :: Type -> Type #

Generic ScheduledInstancesNetworkInterface 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesNetworkInterface

Associated Types

type Rep ScheduledInstancesNetworkInterface :: Type -> Type #

Generic ScheduledInstancesPlacement 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesPlacement

Associated Types

type Rep ScheduledInstancesPlacement :: Type -> Type #

Generic ScheduledInstancesPrivateIpAddressConfig 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesPrivateIpAddressConfig

Generic Scope 
Instance details

Defined in Amazonka.EC2.Types.Scope

Associated Types

type Rep Scope :: Type -> Type #

Methods

from :: Scope -> Rep Scope x #

to :: Rep Scope x -> Scope #

Generic SecurityGroup 
Instance details

Defined in Amazonka.EC2.Types.SecurityGroup

Associated Types

type Rep SecurityGroup :: Type -> Type #

Generic SecurityGroupIdentifier 
Instance details

Defined in Amazonka.EC2.Types.SecurityGroupIdentifier

Associated Types

type Rep SecurityGroupIdentifier :: Type -> Type #

Generic SecurityGroupReference 
Instance details

Defined in Amazonka.EC2.Types.SecurityGroupReference

Associated Types

type Rep SecurityGroupReference :: Type -> Type #

Generic SecurityGroupRule 
Instance details

Defined in Amazonka.EC2.Types.SecurityGroupRule

Associated Types

type Rep SecurityGroupRule :: Type -> Type #

Generic SecurityGroupRuleDescription 
Instance details

Defined in Amazonka.EC2.Types.SecurityGroupRuleDescription

Associated Types

type Rep SecurityGroupRuleDescription :: Type -> Type #

Generic SecurityGroupRuleRequest 
Instance details

Defined in Amazonka.EC2.Types.SecurityGroupRuleRequest

Associated Types

type Rep SecurityGroupRuleRequest :: Type -> Type #

Generic SecurityGroupRuleUpdate 
Instance details

Defined in Amazonka.EC2.Types.SecurityGroupRuleUpdate

Associated Types

type Rep SecurityGroupRuleUpdate :: Type -> Type #

Generic SelfServicePortal 
Instance details

Defined in Amazonka.EC2.Types.SelfServicePortal

Associated Types

type Rep SelfServicePortal :: Type -> Type #

Generic ServiceConfiguration 
Instance details

Defined in Amazonka.EC2.Types.ServiceConfiguration

Associated Types

type Rep ServiceConfiguration :: Type -> Type #

Generic ServiceConnectivityType 
Instance details

Defined in Amazonka.EC2.Types.ServiceConnectivityType

Associated Types

type Rep ServiceConnectivityType :: Type -> Type #

Generic ServiceDetail 
Instance details

Defined in Amazonka.EC2.Types.ServiceDetail

Associated Types

type Rep ServiceDetail :: Type -> Type #

Generic ServiceState 
Instance details

Defined in Amazonka.EC2.Types.ServiceState

Associated Types

type Rep ServiceState :: Type -> Type #

Generic ServiceType 
Instance details

Defined in Amazonka.EC2.Types.ServiceType

Associated Types

type Rep ServiceType :: Type -> Type #

Generic ServiceTypeDetail 
Instance details

Defined in Amazonka.EC2.Types.ServiceTypeDetail

Associated Types

type Rep ServiceTypeDetail :: Type -> Type #

Generic ShutdownBehavior 
Instance details

Defined in Amazonka.EC2.Types.ShutdownBehavior

Associated Types

type Rep ShutdownBehavior :: Type -> Type #

Generic SlotDateTimeRangeRequest 
Instance details

Defined in Amazonka.EC2.Types.SlotDateTimeRangeRequest

Associated Types

type Rep SlotDateTimeRangeRequest :: Type -> Type #

Generic SlotStartTimeRangeRequest 
Instance details

Defined in Amazonka.EC2.Types.SlotStartTimeRangeRequest

Associated Types

type Rep SlotStartTimeRangeRequest :: Type -> Type #

Generic Snapshot 
Instance details

Defined in Amazonka.EC2.Types.Snapshot

Associated Types

type Rep Snapshot :: Type -> Type #

Methods

from :: Snapshot -> Rep Snapshot x #

to :: Rep Snapshot x -> Snapshot #

Generic SnapshotAttributeName 
Instance details

Defined in Amazonka.EC2.Types.SnapshotAttributeName

Associated Types

type Rep SnapshotAttributeName :: Type -> Type #

Generic SnapshotDetail 
Instance details

Defined in Amazonka.EC2.Types.SnapshotDetail

Associated Types

type Rep SnapshotDetail :: Type -> Type #

Generic SnapshotDiskContainer 
Instance details

Defined in Amazonka.EC2.Types.SnapshotDiskContainer

Associated Types

type Rep SnapshotDiskContainer :: Type -> Type #

Generic SnapshotInfo 
Instance details

Defined in Amazonka.EC2.Types.SnapshotInfo

Associated Types

type Rep SnapshotInfo :: Type -> Type #

Generic SnapshotRecycleBinInfo 
Instance details

Defined in Amazonka.EC2.Types.SnapshotRecycleBinInfo

Associated Types

type Rep SnapshotRecycleBinInfo :: Type -> Type #

Generic SnapshotState 
Instance details

Defined in Amazonka.EC2.Types.SnapshotState

Associated Types

type Rep SnapshotState :: Type -> Type #

Generic SnapshotTaskDetail 
Instance details

Defined in Amazonka.EC2.Types.SnapshotTaskDetail

Associated Types

type Rep SnapshotTaskDetail :: Type -> Type #

Generic SnapshotTierStatus 
Instance details

Defined in Amazonka.EC2.Types.SnapshotTierStatus

Associated Types

type Rep SnapshotTierStatus :: Type -> Type #

Generic SpotAllocationStrategy 
Instance details

Defined in Amazonka.EC2.Types.SpotAllocationStrategy

Associated Types

type Rep SpotAllocationStrategy :: Type -> Type #

Generic SpotCapacityRebalance 
Instance details

Defined in Amazonka.EC2.Types.SpotCapacityRebalance

Associated Types

type Rep SpotCapacityRebalance :: Type -> Type #

Generic SpotDatafeedSubscription 
Instance details

Defined in Amazonka.EC2.Types.SpotDatafeedSubscription

Associated Types

type Rep SpotDatafeedSubscription :: Type -> Type #

Generic SpotFleetLaunchSpecification 
Instance details

Defined in Amazonka.EC2.Types.SpotFleetLaunchSpecification

Associated Types

type Rep SpotFleetLaunchSpecification :: Type -> Type #

Generic SpotFleetMonitoring 
Instance details

Defined in Amazonka.EC2.Types.SpotFleetMonitoring

Associated Types

type Rep SpotFleetMonitoring :: Type -> Type #

Generic SpotFleetRequestConfig 
Instance details

Defined in Amazonka.EC2.Types.SpotFleetRequestConfig

Associated Types

type Rep SpotFleetRequestConfig :: Type -> Type #

Generic SpotFleetRequestConfigData 
Instance details

Defined in Amazonka.EC2.Types.SpotFleetRequestConfigData

Associated Types

type Rep SpotFleetRequestConfigData :: Type -> Type #

Generic SpotFleetTagSpecification 
Instance details

Defined in Amazonka.EC2.Types.SpotFleetTagSpecification

Associated Types

type Rep SpotFleetTagSpecification :: Type -> Type #

Generic SpotInstanceInterruptionBehavior 
Instance details

Defined in Amazonka.EC2.Types.SpotInstanceInterruptionBehavior

Associated Types

type Rep SpotInstanceInterruptionBehavior :: Type -> Type #

Generic SpotInstanceRequest 
Instance details

Defined in Amazonka.EC2.Types.SpotInstanceRequest

Associated Types

type Rep SpotInstanceRequest :: Type -> Type #

Generic SpotInstanceState 
Instance details

Defined in Amazonka.EC2.Types.SpotInstanceState

Associated Types

type Rep SpotInstanceState :: Type -> Type #

Generic SpotInstanceStateFault 
Instance details

Defined in Amazonka.EC2.Types.SpotInstanceStateFault

Associated Types

type Rep SpotInstanceStateFault :: Type -> Type #

Generic SpotInstanceStatus 
Instance details

Defined in Amazonka.EC2.Types.SpotInstanceStatus

Associated Types

type Rep SpotInstanceStatus :: Type -> Type #

Generic SpotInstanceType 
Instance details

Defined in Amazonka.EC2.Types.SpotInstanceType

Associated Types

type Rep SpotInstanceType :: Type -> Type #

Generic SpotMaintenanceStrategies 
Instance details

Defined in Amazonka.EC2.Types.SpotMaintenanceStrategies

Associated Types

type Rep SpotMaintenanceStrategies :: Type -> Type #

Generic SpotMarketOptions 
Instance details

Defined in Amazonka.EC2.Types.SpotMarketOptions

Associated Types

type Rep SpotMarketOptions :: Type -> Type #

Generic SpotOptions 
Instance details

Defined in Amazonka.EC2.Types.SpotOptions

Associated Types

type Rep SpotOptions :: Type -> Type #

Generic SpotOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.SpotOptionsRequest

Associated Types

type Rep SpotOptionsRequest :: Type -> Type #

Generic SpotPlacement 
Instance details

Defined in Amazonka.EC2.Types.SpotPlacement

Associated Types

type Rep SpotPlacement :: Type -> Type #

Generic SpotPlacementScore 
Instance details

Defined in Amazonka.EC2.Types.SpotPlacementScore

Associated Types

type Rep SpotPlacementScore :: Type -> Type #

Generic SpotPrice 
Instance details

Defined in Amazonka.EC2.Types.SpotPrice

Associated Types

type Rep SpotPrice :: Type -> Type #

Generic SpreadLevel 
Instance details

Defined in Amazonka.EC2.Types.SpreadLevel

Associated Types

type Rep SpreadLevel :: Type -> Type #

Generic StaleIpPermission 
Instance details

Defined in Amazonka.EC2.Types.StaleIpPermission

Associated Types

type Rep StaleIpPermission :: Type -> Type #

Generic StaleSecurityGroup 
Instance details

Defined in Amazonka.EC2.Types.StaleSecurityGroup

Associated Types

type Rep StaleSecurityGroup :: Type -> Type #

Generic State 
Instance details

Defined in Amazonka.EC2.Types.State

Associated Types

type Rep State :: Type -> Type #

Methods

from :: State -> Rep State x #

to :: Rep State x -> State #

Generic StateReason 
Instance details

Defined in Amazonka.EC2.Types.StateReason

Associated Types

type Rep StateReason :: Type -> Type #

Generic StaticSourcesSupportValue 
Instance details

Defined in Amazonka.EC2.Types.StaticSourcesSupportValue

Associated Types

type Rep StaticSourcesSupportValue :: Type -> Type #

Generic StatisticType 
Instance details

Defined in Amazonka.EC2.Types.StatisticType

Associated Types

type Rep StatisticType :: Type -> Type #

Generic StatusName 
Instance details

Defined in Amazonka.EC2.Types.StatusName

Associated Types

type Rep StatusName :: Type -> Type #

Generic StatusType 
Instance details

Defined in Amazonka.EC2.Types.StatusType

Associated Types

type Rep StatusType :: Type -> Type #

Generic Storage 
Instance details

Defined in Amazonka.EC2.Types.Storage

Associated Types

type Rep Storage :: Type -> Type #

Methods

from :: Storage -> Rep Storage x #

to :: Rep Storage x -> Storage #

Generic StorageLocation 
Instance details

Defined in Amazonka.EC2.Types.StorageLocation

Associated Types

type Rep StorageLocation :: Type -> Type #

Generic StorageTier 
Instance details

Defined in Amazonka.EC2.Types.StorageTier

Associated Types

type Rep StorageTier :: Type -> Type #

Generic StoreImageTaskResult 
Instance details

Defined in Amazonka.EC2.Types.StoreImageTaskResult

Associated Types

type Rep StoreImageTaskResult :: Type -> Type #

Generic Subnet 
Instance details

Defined in Amazonka.EC2.Types.Subnet

Associated Types

type Rep Subnet :: Type -> Type #

Methods

from :: Subnet -> Rep Subnet x #

to :: Rep Subnet x -> Subnet #

Generic SubnetAssociation 
Instance details

Defined in Amazonka.EC2.Types.SubnetAssociation

Associated Types

type Rep SubnetAssociation :: Type -> Type #

Generic SubnetCidrBlockState 
Instance details

Defined in Amazonka.EC2.Types.SubnetCidrBlockState

Associated Types

type Rep SubnetCidrBlockState :: Type -> Type #

Generic SubnetCidrBlockStateCode 
Instance details

Defined in Amazonka.EC2.Types.SubnetCidrBlockStateCode

Associated Types

type Rep SubnetCidrBlockStateCode :: Type -> Type #

Generic SubnetCidrReservation 
Instance details

Defined in Amazonka.EC2.Types.SubnetCidrReservation

Associated Types

type Rep SubnetCidrReservation :: Type -> Type #

Generic SubnetCidrReservationType 
Instance details

Defined in Amazonka.EC2.Types.SubnetCidrReservationType

Associated Types

type Rep SubnetCidrReservationType :: Type -> Type #

Generic SubnetIpv6CidrBlockAssociation 
Instance details

Defined in Amazonka.EC2.Types.SubnetIpv6CidrBlockAssociation

Associated Types

type Rep SubnetIpv6CidrBlockAssociation :: Type -> Type #

Generic SubnetState 
Instance details

Defined in Amazonka.EC2.Types.SubnetState

Associated Types

type Rep SubnetState :: Type -> Type #

Generic Subscription 
Instance details

Defined in Amazonka.EC2.Types.Subscription

Associated Types

type Rep Subscription :: Type -> Type #

Generic SuccessfulInstanceCreditSpecificationItem 
Instance details

Defined in Amazonka.EC2.Types.SuccessfulInstanceCreditSpecificationItem

Generic SuccessfulQueuedPurchaseDeletion 
Instance details

Defined in Amazonka.EC2.Types.SuccessfulQueuedPurchaseDeletion

Associated Types

type Rep SuccessfulQueuedPurchaseDeletion :: Type -> Type #

Generic SummaryStatus 
Instance details

Defined in Amazonka.EC2.Types.SummaryStatus

Associated Types

type Rep SummaryStatus :: Type -> Type #

Generic Tag 
Instance details

Defined in Amazonka.EC2.Types.Tag

Associated Types

type Rep Tag :: Type -> Type #

Methods

from :: Tag -> Rep Tag x #

to :: Rep Tag x -> Tag #

Generic TagDescription 
Instance details

Defined in Amazonka.EC2.Types.TagDescription

Associated Types

type Rep TagDescription :: Type -> Type #

Generic TagSpecification 
Instance details

Defined in Amazonka.EC2.Types.TagSpecification

Associated Types

type Rep TagSpecification :: Type -> Type #

Generic TargetCapacitySpecification 
Instance details

Defined in Amazonka.EC2.Types.TargetCapacitySpecification

Associated Types

type Rep TargetCapacitySpecification :: Type -> Type #

Generic TargetCapacitySpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.TargetCapacitySpecificationRequest

Associated Types

type Rep TargetCapacitySpecificationRequest :: Type -> Type #

Generic TargetCapacityUnitType 
Instance details

Defined in Amazonka.EC2.Types.TargetCapacityUnitType

Associated Types

type Rep TargetCapacityUnitType :: Type -> Type #

Generic TargetConfiguration 
Instance details

Defined in Amazonka.EC2.Types.TargetConfiguration

Associated Types

type Rep TargetConfiguration :: Type -> Type #

Generic TargetConfigurationRequest 
Instance details

Defined in Amazonka.EC2.Types.TargetConfigurationRequest

Associated Types

type Rep TargetConfigurationRequest :: Type -> Type #

Generic TargetGroup 
Instance details

Defined in Amazonka.EC2.Types.TargetGroup

Associated Types

type Rep TargetGroup :: Type -> Type #

Generic TargetGroupsConfig 
Instance details

Defined in Amazonka.EC2.Types.TargetGroupsConfig

Associated Types

type Rep TargetGroupsConfig :: Type -> Type #

Generic TargetNetwork 
Instance details

Defined in Amazonka.EC2.Types.TargetNetwork

Associated Types

type Rep TargetNetwork :: Type -> Type #

Generic TargetReservationValue 
Instance details

Defined in Amazonka.EC2.Types.TargetReservationValue

Associated Types

type Rep TargetReservationValue :: Type -> Type #

Generic TargetStorageTier 
Instance details

Defined in Amazonka.EC2.Types.TargetStorageTier

Associated Types

type Rep TargetStorageTier :: Type -> Type #

Generic TelemetryStatus 
Instance details

Defined in Amazonka.EC2.Types.TelemetryStatus

Associated Types

type Rep TelemetryStatus :: Type -> Type #

Generic Tenancy 
Instance details

Defined in Amazonka.EC2.Types.Tenancy

Associated Types

type Rep Tenancy :: Type -> Type #

Methods

from :: Tenancy -> Rep Tenancy x #

to :: Rep Tenancy x -> Tenancy #

Generic TerminateConnectionStatus 
Instance details

Defined in Amazonka.EC2.Types.TerminateConnectionStatus

Associated Types

type Rep TerminateConnectionStatus :: Type -> Type #

Generic ThroughResourcesStatement 
Instance details

Defined in Amazonka.EC2.Types.ThroughResourcesStatement

Associated Types

type Rep ThroughResourcesStatement :: Type -> Type #

Generic ThroughResourcesStatementRequest 
Instance details

Defined in Amazonka.EC2.Types.ThroughResourcesStatementRequest

Associated Types

type Rep ThroughResourcesStatementRequest :: Type -> Type #

Generic TieringOperationStatus 
Instance details

Defined in Amazonka.EC2.Types.TieringOperationStatus

Associated Types

type Rep TieringOperationStatus :: Type -> Type #

Generic TotalLocalStorageGB 
Instance details

Defined in Amazonka.EC2.Types.TotalLocalStorageGB

Associated Types

type Rep TotalLocalStorageGB :: Type -> Type #

Generic TotalLocalStorageGBRequest 
Instance details

Defined in Amazonka.EC2.Types.TotalLocalStorageGBRequest

Associated Types

type Rep TotalLocalStorageGBRequest :: Type -> Type #

Generic TpmSupportValues 
Instance details

Defined in Amazonka.EC2.Types.TpmSupportValues

Associated Types

type Rep TpmSupportValues :: Type -> Type #

Generic TrafficDirection 
Instance details

Defined in Amazonka.EC2.Types.TrafficDirection

Associated Types

type Rep TrafficDirection :: Type -> Type #

Generic TrafficMirrorFilter 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorFilter

Associated Types

type Rep TrafficMirrorFilter :: Type -> Type #

Generic TrafficMirrorFilterRule 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorFilterRule

Associated Types

type Rep TrafficMirrorFilterRule :: Type -> Type #

Generic TrafficMirrorFilterRuleField 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorFilterRuleField

Associated Types

type Rep TrafficMirrorFilterRuleField :: Type -> Type #

Generic TrafficMirrorNetworkService 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorNetworkService

Associated Types

type Rep TrafficMirrorNetworkService :: Type -> Type #

Generic TrafficMirrorPortRange 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorPortRange

Associated Types

type Rep TrafficMirrorPortRange :: Type -> Type #

Generic TrafficMirrorPortRangeRequest 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorPortRangeRequest

Associated Types

type Rep TrafficMirrorPortRangeRequest :: Type -> Type #

Generic TrafficMirrorRuleAction 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorRuleAction

Associated Types

type Rep TrafficMirrorRuleAction :: Type -> Type #

Generic TrafficMirrorSession 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorSession

Associated Types

type Rep TrafficMirrorSession :: Type -> Type #

Generic TrafficMirrorSessionField 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorSessionField

Associated Types

type Rep TrafficMirrorSessionField :: Type -> Type #

Generic TrafficMirrorTarget 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorTarget

Associated Types

type Rep TrafficMirrorTarget :: Type -> Type #

Generic TrafficMirrorTargetType 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorTargetType

Associated Types

type Rep TrafficMirrorTargetType :: Type -> Type #

Generic TrafficType 
Instance details

Defined in Amazonka.EC2.Types.TrafficType

Associated Types

type Rep TrafficType :: Type -> Type #

Generic TransitGateway 
Instance details

Defined in Amazonka.EC2.Types.TransitGateway

Associated Types

type Rep TransitGateway :: Type -> Type #

Generic TransitGatewayAssociation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAssociation

Associated Types

type Rep TransitGatewayAssociation :: Type -> Type #

Generic TransitGatewayAssociationState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAssociationState

Associated Types

type Rep TransitGatewayAssociationState :: Type -> Type #

Generic TransitGatewayAttachment 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAttachment

Associated Types

type Rep TransitGatewayAttachment :: Type -> Type #

Generic TransitGatewayAttachmentAssociation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAttachmentAssociation

Generic TransitGatewayAttachmentBgpConfiguration 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAttachmentBgpConfiguration

Generic TransitGatewayAttachmentPropagation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAttachmentPropagation

Generic TransitGatewayAttachmentResourceType 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAttachmentResourceType

Generic TransitGatewayAttachmentState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAttachmentState

Associated Types

type Rep TransitGatewayAttachmentState :: Type -> Type #

Generic TransitGatewayConnect 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayConnect

Associated Types

type Rep TransitGatewayConnect :: Type -> Type #

Generic TransitGatewayConnectOptions 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayConnectOptions

Associated Types

type Rep TransitGatewayConnectOptions :: Type -> Type #

Generic TransitGatewayConnectPeer 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayConnectPeer

Associated Types

type Rep TransitGatewayConnectPeer :: Type -> Type #

Generic TransitGatewayConnectPeerConfiguration 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayConnectPeerConfiguration

Generic TransitGatewayConnectPeerState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayConnectPeerState

Associated Types

type Rep TransitGatewayConnectPeerState :: Type -> Type #

Generic TransitGatewayConnectRequestBgpOptions 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayConnectRequestBgpOptions

Generic TransitGatewayMulitcastDomainAssociationState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulitcastDomainAssociationState

Generic TransitGatewayMulticastDeregisteredGroupMembers 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastDeregisteredGroupMembers

Generic TransitGatewayMulticastDeregisteredGroupSources 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastDeregisteredGroupSources

Generic TransitGatewayMulticastDomain 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastDomain

Associated Types

type Rep TransitGatewayMulticastDomain :: Type -> Type #

Generic TransitGatewayMulticastDomainAssociation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastDomainAssociation

Generic TransitGatewayMulticastDomainAssociations 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastDomainAssociations

Generic TransitGatewayMulticastDomainOptions 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastDomainOptions

Generic TransitGatewayMulticastDomainState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastDomainState

Associated Types

type Rep TransitGatewayMulticastDomainState :: Type -> Type #

Generic TransitGatewayMulticastGroup 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastGroup

Associated Types

type Rep TransitGatewayMulticastGroup :: Type -> Type #

Generic TransitGatewayMulticastRegisteredGroupMembers 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastRegisteredGroupMembers

Generic TransitGatewayMulticastRegisteredGroupSources 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastRegisteredGroupSources

Generic TransitGatewayOptions 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayOptions

Associated Types

type Rep TransitGatewayOptions :: Type -> Type #

Generic TransitGatewayPeeringAttachment 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPeeringAttachment

Associated Types

type Rep TransitGatewayPeeringAttachment :: Type -> Type #

Generic TransitGatewayPeeringAttachmentOptions 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPeeringAttachmentOptions

Generic TransitGatewayPolicyRule 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPolicyRule

Associated Types

type Rep TransitGatewayPolicyRule :: Type -> Type #

Generic TransitGatewayPolicyRuleMetaData 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPolicyRuleMetaData

Associated Types

type Rep TransitGatewayPolicyRuleMetaData :: Type -> Type #

Generic TransitGatewayPolicyTable 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPolicyTable

Associated Types

type Rep TransitGatewayPolicyTable :: Type -> Type #

Generic TransitGatewayPolicyTableAssociation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPolicyTableAssociation

Generic TransitGatewayPolicyTableEntry 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPolicyTableEntry

Associated Types

type Rep TransitGatewayPolicyTableEntry :: Type -> Type #

Generic TransitGatewayPolicyTableState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPolicyTableState

Associated Types

type Rep TransitGatewayPolicyTableState :: Type -> Type #

Generic TransitGatewayPrefixListAttachment 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPrefixListAttachment

Associated Types

type Rep TransitGatewayPrefixListAttachment :: Type -> Type #

Generic TransitGatewayPrefixListReference 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPrefixListReference

Associated Types

type Rep TransitGatewayPrefixListReference :: Type -> Type #

Generic TransitGatewayPrefixListReferenceState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPrefixListReferenceState

Generic TransitGatewayPropagation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPropagation

Associated Types

type Rep TransitGatewayPropagation :: Type -> Type #

Generic TransitGatewayPropagationState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPropagationState

Associated Types

type Rep TransitGatewayPropagationState :: Type -> Type #

Generic TransitGatewayRequestOptions 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRequestOptions

Associated Types

type Rep TransitGatewayRequestOptions :: Type -> Type #

Generic TransitGatewayRoute 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRoute

Associated Types

type Rep TransitGatewayRoute :: Type -> Type #

Generic TransitGatewayRouteAttachment 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteAttachment

Associated Types

type Rep TransitGatewayRouteAttachment :: Type -> Type #

Generic TransitGatewayRouteState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteState

Associated Types

type Rep TransitGatewayRouteState :: Type -> Type #

Generic TransitGatewayRouteTable 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTable

Associated Types

type Rep TransitGatewayRouteTable :: Type -> Type #

Generic TransitGatewayRouteTableAnnouncement 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTableAnnouncement

Generic TransitGatewayRouteTableAnnouncementDirection 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTableAnnouncementDirection

Generic TransitGatewayRouteTableAnnouncementState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTableAnnouncementState

Generic TransitGatewayRouteTableAssociation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTableAssociation

Generic TransitGatewayRouteTablePropagation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTablePropagation

Generic TransitGatewayRouteTableRoute 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTableRoute

Associated Types

type Rep TransitGatewayRouteTableRoute :: Type -> Type #

Generic TransitGatewayRouteTableState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTableState

Associated Types

type Rep TransitGatewayRouteTableState :: Type -> Type #

Generic TransitGatewayRouteType 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteType

Associated Types

type Rep TransitGatewayRouteType :: Type -> Type #

Generic TransitGatewayState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayState

Associated Types

type Rep TransitGatewayState :: Type -> Type #

Generic TransitGatewayVpcAttachment 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayVpcAttachment

Associated Types

type Rep TransitGatewayVpcAttachment :: Type -> Type #

Generic TransitGatewayVpcAttachmentOptions 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayVpcAttachmentOptions

Associated Types

type Rep TransitGatewayVpcAttachmentOptions :: Type -> Type #

Generic TransportProtocol 
Instance details

Defined in Amazonka.EC2.Types.TransportProtocol

Associated Types

type Rep TransportProtocol :: Type -> Type #

Generic TrunkInterfaceAssociation 
Instance details

Defined in Amazonka.EC2.Types.TrunkInterfaceAssociation

Associated Types

type Rep TrunkInterfaceAssociation :: Type -> Type #

Generic TrustProviderType 
Instance details

Defined in Amazonka.EC2.Types.TrustProviderType

Associated Types

type Rep TrustProviderType :: Type -> Type #

Generic TunnelInsideIpVersion 
Instance details

Defined in Amazonka.EC2.Types.TunnelInsideIpVersion

Associated Types

type Rep TunnelInsideIpVersion :: Type -> Type #

Generic TunnelOption 
Instance details

Defined in Amazonka.EC2.Types.TunnelOption

Associated Types

type Rep TunnelOption :: Type -> Type #

Generic UnlimitedSupportedInstanceFamily 
Instance details

Defined in Amazonka.EC2.Types.UnlimitedSupportedInstanceFamily

Associated Types

type Rep UnlimitedSupportedInstanceFamily :: Type -> Type #

Generic UnsuccessfulInstanceCreditSpecificationErrorCode 
Instance details

Defined in Amazonka.EC2.Types.UnsuccessfulInstanceCreditSpecificationErrorCode

Generic UnsuccessfulInstanceCreditSpecificationItem 
Instance details

Defined in Amazonka.EC2.Types.UnsuccessfulInstanceCreditSpecificationItem

Generic UnsuccessfulInstanceCreditSpecificationItemError 
Instance details

Defined in Amazonka.EC2.Types.UnsuccessfulInstanceCreditSpecificationItemError

Generic UnsuccessfulItem 
Instance details

Defined in Amazonka.EC2.Types.UnsuccessfulItem

Associated Types

type Rep UnsuccessfulItem :: Type -> Type #

Generic UnsuccessfulItemError 
Instance details

Defined in Amazonka.EC2.Types.UnsuccessfulItemError

Associated Types

type Rep UnsuccessfulItemError :: Type -> Type #

Generic UsageClassType 
Instance details

Defined in Amazonka.EC2.Types.UsageClassType

Associated Types

type Rep UsageClassType :: Type -> Type #

Generic UserBucket 
Instance details

Defined in Amazonka.EC2.Types.UserBucket

Associated Types

type Rep UserBucket :: Type -> Type #

Generic UserBucketDetails 
Instance details

Defined in Amazonka.EC2.Types.UserBucketDetails

Associated Types

type Rep UserBucketDetails :: Type -> Type #

Generic UserData 
Instance details

Defined in Amazonka.EC2.Types.UserData

Associated Types

type Rep UserData :: Type -> Type #

Methods

from :: UserData -> Rep UserData x #

to :: Rep UserData x -> UserData #

Generic UserIdGroupPair 
Instance details

Defined in Amazonka.EC2.Types.UserIdGroupPair

Associated Types

type Rep UserIdGroupPair :: Type -> Type #

Generic UserTrustProviderType 
Instance details

Defined in Amazonka.EC2.Types.UserTrustProviderType

Associated Types

type Rep UserTrustProviderType :: Type -> Type #

Generic VCpuCountRange 
Instance details

Defined in Amazonka.EC2.Types.VCpuCountRange

Associated Types

type Rep VCpuCountRange :: Type -> Type #

Generic VCpuCountRangeRequest 
Instance details

Defined in Amazonka.EC2.Types.VCpuCountRangeRequest

Associated Types

type Rep VCpuCountRangeRequest :: Type -> Type #

Generic VCpuInfo 
Instance details

Defined in Amazonka.EC2.Types.VCpuInfo

Associated Types

type Rep VCpuInfo :: Type -> Type #

Methods

from :: VCpuInfo -> Rep VCpuInfo x #

to :: Rep VCpuInfo x -> VCpuInfo #

Generic ValidationError 
Instance details

Defined in Amazonka.EC2.Types.ValidationError

Associated Types

type Rep ValidationError :: Type -> Type #

Generic ValidationWarning 
Instance details

Defined in Amazonka.EC2.Types.ValidationWarning

Associated Types

type Rep ValidationWarning :: Type -> Type #

Generic VerifiedAccessEndpoint 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpoint

Associated Types

type Rep VerifiedAccessEndpoint :: Type -> Type #

Generic VerifiedAccessEndpointAttachmentType 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointAttachmentType

Generic VerifiedAccessEndpointEniOptions 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointEniOptions

Associated Types

type Rep VerifiedAccessEndpointEniOptions :: Type -> Type #

Generic VerifiedAccessEndpointLoadBalancerOptions 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointLoadBalancerOptions

Generic VerifiedAccessEndpointProtocol 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointProtocol

Associated Types

type Rep VerifiedAccessEndpointProtocol :: Type -> Type #

Generic VerifiedAccessEndpointStatus 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointStatus

Associated Types

type Rep VerifiedAccessEndpointStatus :: Type -> Type #

Generic VerifiedAccessEndpointStatusCode 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointStatusCode

Associated Types

type Rep VerifiedAccessEndpointStatusCode :: Type -> Type #

Generic VerifiedAccessEndpointType 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointType

Associated Types

type Rep VerifiedAccessEndpointType :: Type -> Type #

Generic VerifiedAccessGroup 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessGroup

Associated Types

type Rep VerifiedAccessGroup :: Type -> Type #

Generic VerifiedAccessInstance 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessInstance

Associated Types

type Rep VerifiedAccessInstance :: Type -> Type #

Generic VerifiedAccessInstanceLoggingConfiguration 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessInstanceLoggingConfiguration

Generic VerifiedAccessLogCloudWatchLogsDestination 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogCloudWatchLogsDestination

Generic VerifiedAccessLogCloudWatchLogsDestinationOptions 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogCloudWatchLogsDestinationOptions

Generic VerifiedAccessLogDeliveryStatus 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogDeliveryStatus

Associated Types

type Rep VerifiedAccessLogDeliveryStatus :: Type -> Type #

Generic VerifiedAccessLogDeliveryStatusCode 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogDeliveryStatusCode

Generic VerifiedAccessLogKinesisDataFirehoseDestination 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogKinesisDataFirehoseDestination

Generic VerifiedAccessLogKinesisDataFirehoseDestinationOptions 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogKinesisDataFirehoseDestinationOptions

Generic VerifiedAccessLogOptions 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogOptions

Associated Types

type Rep VerifiedAccessLogOptions :: Type -> Type #

Generic VerifiedAccessLogS3Destination 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogS3Destination

Associated Types

type Rep VerifiedAccessLogS3Destination :: Type -> Type #

Generic VerifiedAccessLogS3DestinationOptions 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogS3DestinationOptions

Generic VerifiedAccessLogs 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogs

Associated Types

type Rep VerifiedAccessLogs :: Type -> Type #

Generic VerifiedAccessTrustProvider 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessTrustProvider

Associated Types

type Rep VerifiedAccessTrustProvider :: Type -> Type #

Generic VerifiedAccessTrustProviderCondensed 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessTrustProviderCondensed

Generic VgwTelemetry 
Instance details

Defined in Amazonka.EC2.Types.VgwTelemetry

Associated Types

type Rep VgwTelemetry :: Type -> Type #

Generic VirtualizationType 
Instance details

Defined in Amazonka.EC2.Types.VirtualizationType

Associated Types

type Rep VirtualizationType :: Type -> Type #

Generic Volume 
Instance details

Defined in Amazonka.EC2.Types.Volume

Associated Types

type Rep Volume :: Type -> Type #

Methods

from :: Volume -> Rep Volume x #

to :: Rep Volume x -> Volume #

Generic VolumeAttachment 
Instance details

Defined in Amazonka.EC2.Types.VolumeAttachment

Associated Types

type Rep VolumeAttachment :: Type -> Type #

Generic VolumeAttachmentState 
Instance details

Defined in Amazonka.EC2.Types.VolumeAttachmentState

Associated Types

type Rep VolumeAttachmentState :: Type -> Type #

Generic VolumeAttributeName 
Instance details

Defined in Amazonka.EC2.Types.VolumeAttributeName

Associated Types

type Rep VolumeAttributeName :: Type -> Type #

Generic VolumeDetail 
Instance details

Defined in Amazonka.EC2.Types.VolumeDetail

Associated Types

type Rep VolumeDetail :: Type -> Type #

Generic VolumeModification 
Instance details

Defined in Amazonka.EC2.Types.VolumeModification

Associated Types

type Rep VolumeModification :: Type -> Type #

Generic VolumeModificationState 
Instance details

Defined in Amazonka.EC2.Types.VolumeModificationState

Associated Types

type Rep VolumeModificationState :: Type -> Type #

Generic VolumeState 
Instance details

Defined in Amazonka.EC2.Types.VolumeState

Associated Types

type Rep VolumeState :: Type -> Type #

Generic VolumeStatusAction 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusAction

Associated Types

type Rep VolumeStatusAction :: Type -> Type #

Generic VolumeStatusAttachmentStatus 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusAttachmentStatus

Associated Types

type Rep VolumeStatusAttachmentStatus :: Type -> Type #

Generic VolumeStatusDetails 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusDetails

Associated Types

type Rep VolumeStatusDetails :: Type -> Type #

Generic VolumeStatusEvent 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusEvent

Associated Types

type Rep VolumeStatusEvent :: Type -> Type #

Generic VolumeStatusInfo 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusInfo

Associated Types

type Rep VolumeStatusInfo :: Type -> Type #

Generic VolumeStatusInfoStatus 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusInfoStatus

Associated Types

type Rep VolumeStatusInfoStatus :: Type -> Type #

Generic VolumeStatusItem 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusItem

Associated Types

type Rep VolumeStatusItem :: Type -> Type #

Generic VolumeStatusName 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusName

Associated Types

type Rep VolumeStatusName :: Type -> Type #

Generic VolumeType 
Instance details

Defined in Amazonka.EC2.Types.VolumeType

Associated Types

type Rep VolumeType :: Type -> Type #

Generic Vpc 
Instance details

Defined in Amazonka.EC2.Types.Vpc

Associated Types

type Rep Vpc :: Type -> Type #

Methods

from :: Vpc -> Rep Vpc x #

to :: Rep Vpc x -> Vpc #

Generic VpcAttachment 
Instance details

Defined in Amazonka.EC2.Types.VpcAttachment

Associated Types

type Rep VpcAttachment :: Type -> Type #

Generic VpcAttributeName 
Instance details

Defined in Amazonka.EC2.Types.VpcAttributeName

Associated Types

type Rep VpcAttributeName :: Type -> Type #

Generic VpcCidrBlockAssociation 
Instance details

Defined in Amazonka.EC2.Types.VpcCidrBlockAssociation

Associated Types

type Rep VpcCidrBlockAssociation :: Type -> Type #

Generic VpcCidrBlockState 
Instance details

Defined in Amazonka.EC2.Types.VpcCidrBlockState

Associated Types

type Rep VpcCidrBlockState :: Type -> Type #

Generic VpcCidrBlockStateCode 
Instance details

Defined in Amazonka.EC2.Types.VpcCidrBlockStateCode

Associated Types

type Rep VpcCidrBlockStateCode :: Type -> Type #

Generic VpcClassicLink 
Instance details

Defined in Amazonka.EC2.Types.VpcClassicLink

Associated Types

type Rep VpcClassicLink :: Type -> Type #

Generic VpcEndpoint 
Instance details

Defined in Amazonka.EC2.Types.VpcEndpoint

Associated Types

type Rep VpcEndpoint :: Type -> Type #

Generic VpcEndpointConnection 
Instance details

Defined in Amazonka.EC2.Types.VpcEndpointConnection

Associated Types

type Rep VpcEndpointConnection :: Type -> Type #

Generic VpcEndpointType 
Instance details

Defined in Amazonka.EC2.Types.VpcEndpointType

Associated Types

type Rep VpcEndpointType :: Type -> Type #

Generic VpcIpv6CidrBlockAssociation 
Instance details

Defined in Amazonka.EC2.Types.VpcIpv6CidrBlockAssociation

Associated Types

type Rep VpcIpv6CidrBlockAssociation :: Type -> Type #

Generic VpcPeeringConnection 
Instance details

Defined in Amazonka.EC2.Types.VpcPeeringConnection

Associated Types

type Rep VpcPeeringConnection :: Type -> Type #

Generic VpcPeeringConnectionOptionsDescription 
Instance details

Defined in Amazonka.EC2.Types.VpcPeeringConnectionOptionsDescription

Generic VpcPeeringConnectionStateReason 
Instance details

Defined in Amazonka.EC2.Types.VpcPeeringConnectionStateReason

Associated Types

type Rep VpcPeeringConnectionStateReason :: Type -> Type #

Generic VpcPeeringConnectionStateReasonCode 
Instance details

Defined in Amazonka.EC2.Types.VpcPeeringConnectionStateReasonCode

Generic VpcPeeringConnectionVpcInfo 
Instance details

Defined in Amazonka.EC2.Types.VpcPeeringConnectionVpcInfo

Associated Types

type Rep VpcPeeringConnectionVpcInfo :: Type -> Type #

Generic VpcState 
Instance details

Defined in Amazonka.EC2.Types.VpcState

Associated Types

type Rep VpcState :: Type -> Type #

Methods

from :: VpcState -> Rep VpcState x #

to :: Rep VpcState x -> VpcState #

Generic VpcTenancy 
Instance details

Defined in Amazonka.EC2.Types.VpcTenancy

Associated Types

type Rep VpcTenancy :: Type -> Type #

Generic VpnConnection 
Instance details

Defined in Amazonka.EC2.Types.VpnConnection

Associated Types

type Rep VpnConnection :: Type -> Type #

Generic VpnConnectionDeviceType 
Instance details

Defined in Amazonka.EC2.Types.VpnConnectionDeviceType

Associated Types

type Rep VpnConnectionDeviceType :: Type -> Type #

Generic VpnConnectionOptions 
Instance details

Defined in Amazonka.EC2.Types.VpnConnectionOptions

Associated Types

type Rep VpnConnectionOptions :: Type -> Type #

Generic VpnConnectionOptionsSpecification 
Instance details

Defined in Amazonka.EC2.Types.VpnConnectionOptionsSpecification

Associated Types

type Rep VpnConnectionOptionsSpecification :: Type -> Type #

Generic VpnEcmpSupportValue 
Instance details

Defined in Amazonka.EC2.Types.VpnEcmpSupportValue

Associated Types

type Rep VpnEcmpSupportValue :: Type -> Type #

Generic VpnGateway 
Instance details

Defined in Amazonka.EC2.Types.VpnGateway

Associated Types

type Rep VpnGateway :: Type -> Type #

Generic VpnProtocol 
Instance details

Defined in Amazonka.EC2.Types.VpnProtocol

Associated Types

type Rep VpnProtocol :: Type -> Type #

Generic VpnState 
Instance details

Defined in Amazonka.EC2.Types.VpnState

Associated Types

type Rep VpnState :: Type -> Type #

Methods

from :: VpnState -> Rep VpnState x #

to :: Rep VpnState x -> VpnState #

Generic VpnStaticRoute 
Instance details

Defined in Amazonka.EC2.Types.VpnStaticRoute

Associated Types

type Rep VpnStaticRoute :: Type -> Type #

Generic VpnStaticRouteSource 
Instance details

Defined in Amazonka.EC2.Types.VpnStaticRouteSource

Associated Types

type Rep VpnStaticRouteSource :: Type -> Type #

Generic VpnTunnelLogOptions 
Instance details

Defined in Amazonka.EC2.Types.VpnTunnelLogOptions

Associated Types

type Rep VpnTunnelLogOptions :: Type -> Type #

Generic VpnTunnelLogOptionsSpecification 
Instance details

Defined in Amazonka.EC2.Types.VpnTunnelLogOptionsSpecification

Associated Types

type Rep VpnTunnelLogOptionsSpecification :: Type -> Type #

Generic VpnTunnelOptionsSpecification 
Instance details

Defined in Amazonka.EC2.Types.VpnTunnelOptionsSpecification

Associated Types

type Rep VpnTunnelOptionsSpecification :: Type -> Type #

Generic WeekDay 
Instance details

Defined in Amazonka.EC2.Types.WeekDay

Associated Types

type Rep WeekDay :: Type -> Type #

Methods

from :: WeekDay -> Rep WeekDay x #

to :: Rep WeekDay x -> WeekDay #

Generic Invoke 
Instance details

Defined in Amazonka.Lambda.Invoke

Associated Types

type Rep Invoke :: Type -> Type #

Methods

from :: Invoke -> Rep Invoke x #

to :: Rep Invoke x -> Invoke #

Generic InvokeResponse 
Instance details

Defined in Amazonka.Lambda.Invoke

Associated Types

type Rep InvokeResponse :: Type -> Type #

Generic AccountLimit 
Instance details

Defined in Amazonka.Lambda.Types.AccountLimit

Associated Types

type Rep AccountLimit :: Type -> Type #

Generic AccountUsage 
Instance details

Defined in Amazonka.Lambda.Types.AccountUsage

Associated Types

type Rep AccountUsage :: Type -> Type #

Generic AliasConfiguration 
Instance details

Defined in Amazonka.Lambda.Types.AliasConfiguration

Associated Types

type Rep AliasConfiguration :: Type -> Type #

Generic AliasRoutingConfiguration 
Instance details

Defined in Amazonka.Lambda.Types.AliasRoutingConfiguration

Associated Types

type Rep AliasRoutingConfiguration :: Type -> Type #

Generic AllowedPublishers 
Instance details

Defined in Amazonka.Lambda.Types.AllowedPublishers

Associated Types

type Rep AllowedPublishers :: Type -> Type #

Generic AmazonManagedKafkaEventSourceConfig 
Instance details

Defined in Amazonka.Lambda.Types.AmazonManagedKafkaEventSourceConfig

Generic Architecture 
Instance details

Defined in Amazonka.Lambda.Types.Architecture

Associated Types

type Rep Architecture :: Type -> Type #

Generic CodeSigningConfig 
Instance details

Defined in Amazonka.Lambda.Types.CodeSigningConfig

Associated Types

type Rep CodeSigningConfig :: Type -> Type #

Generic CodeSigningPolicies 
Instance details

Defined in Amazonka.Lambda.Types.CodeSigningPolicies

Associated Types

type Rep CodeSigningPolicies :: Type -> Type #

Generic CodeSigningPolicy 
Instance details

Defined in Amazonka.Lambda.Types.CodeSigningPolicy

Associated Types

type Rep CodeSigningPolicy :: Type -> Type #

Generic Concurrency 
Instance details

Defined in Amazonka.Lambda.Types.Concurrency

Associated Types

type Rep Concurrency :: Type -> Type #

Generic Cors 
Instance details

Defined in Amazonka.Lambda.Types.Cors

Associated Types

type Rep Cors :: Type -> Type #

Methods

from :: Cors -> Rep Cors x #

to :: Rep Cors x -> Cors #

Generic DeadLetterConfig 
Instance details

Defined in Amazonka.Lambda.Types.DeadLetterConfig

Associated Types

type Rep DeadLetterConfig :: Type -> Type #

Generic DestinationConfig 
Instance details

Defined in Amazonka.Lambda.Types.DestinationConfig

Associated Types

type Rep DestinationConfig :: Type -> Type #

Generic EndPointType 
Instance details

Defined in Amazonka.Lambda.Types.EndPointType

Associated Types

type Rep EndPointType :: Type -> Type #

Generic Environment 
Instance details

Defined in Amazonka.Lambda.Types.Environment

Associated Types

type Rep Environment :: Type -> Type #

Generic EnvironmentError 
Instance details

Defined in Amazonka.Lambda.Types.EnvironmentError

Associated Types

type Rep EnvironmentError :: Type -> Type #

Generic EnvironmentResponse 
Instance details

Defined in Amazonka.Lambda.Types.EnvironmentResponse

Associated Types

type Rep EnvironmentResponse :: Type -> Type #

Generic EphemeralStorage 
Instance details

Defined in Amazonka.Lambda.Types.EphemeralStorage

Associated Types

type Rep EphemeralStorage :: Type -> Type #

Generic EventSourceMappingConfiguration 
Instance details

Defined in Amazonka.Lambda.Types.EventSourceMappingConfiguration

Associated Types

type Rep EventSourceMappingConfiguration :: Type -> Type #

Generic EventSourcePosition 
Instance details

Defined in Amazonka.Lambda.Types.EventSourcePosition

Associated Types

type Rep EventSourcePosition :: Type -> Type #

Generic FileSystemConfig 
Instance details

Defined in Amazonka.Lambda.Types.FileSystemConfig

Associated Types

type Rep FileSystemConfig :: Type -> Type #

Generic Filter 
Instance details

Defined in Amazonka.Lambda.Types.Filter

Associated Types

type Rep Filter :: Type -> Type #

Methods

from :: Filter -> Rep Filter x #

to :: Rep Filter x -> Filter #

Generic FilterCriteria 
Instance details

Defined in Amazonka.Lambda.Types.FilterCriteria

Associated Types

type Rep FilterCriteria :: Type -> Type #

Generic FunctionCode 
Instance details

Defined in Amazonka.Lambda.Types.FunctionCode

Associated Types

type Rep FunctionCode :: Type -> Type #

Generic FunctionCodeLocation 
Instance details

Defined in Amazonka.Lambda.Types.FunctionCodeLocation

Associated Types

type Rep FunctionCodeLocation :: Type -> Type #

Generic FunctionConfiguration 
Instance details

Defined in Amazonka.Lambda.Types.FunctionConfiguration

Associated Types

type Rep FunctionConfiguration :: Type -> Type #

Generic FunctionEventInvokeConfig 
Instance details

Defined in Amazonka.Lambda.Types.FunctionEventInvokeConfig

Associated Types

type Rep FunctionEventInvokeConfig :: Type -> Type #

Generic FunctionResponseType 
Instance details

Defined in Amazonka.Lambda.Types.FunctionResponseType

Associated Types

type Rep FunctionResponseType :: Type -> Type #

Generic FunctionUrlAuthType 
Instance details

Defined in Amazonka.Lambda.Types.FunctionUrlAuthType

Associated Types

type Rep FunctionUrlAuthType :: Type -> Type #

Generic FunctionUrlConfig 
Instance details

Defined in Amazonka.Lambda.Types.FunctionUrlConfig

Associated Types

type Rep FunctionUrlConfig :: Type -> Type #

Generic FunctionVersion 
Instance details

Defined in Amazonka.Lambda.Types.FunctionVersion

Associated Types

type Rep FunctionVersion :: Type -> Type #

Generic GetLayerVersionResponse 
Instance details

Defined in Amazonka.Lambda.Types.GetLayerVersionResponse

Associated Types

type Rep GetLayerVersionResponse :: Type -> Type #

Generic ImageConfig 
Instance details

Defined in Amazonka.Lambda.Types.ImageConfig

Associated Types

type Rep ImageConfig :: Type -> Type #

Generic ImageConfigError 
Instance details

Defined in Amazonka.Lambda.Types.ImageConfigError

Associated Types

type Rep ImageConfigError :: Type -> Type #

Generic ImageConfigResponse 
Instance details

Defined in Amazonka.Lambda.Types.ImageConfigResponse

Associated Types

type Rep ImageConfigResponse :: Type -> Type #

Generic InvocationType 
Instance details

Defined in Amazonka.Lambda.Types.InvocationType

Associated Types

type Rep InvocationType :: Type -> Type #

Generic LastUpdateStatus 
Instance details

Defined in Amazonka.Lambda.Types.LastUpdateStatus

Associated Types

type Rep LastUpdateStatus :: Type -> Type #

Generic LastUpdateStatusReasonCode 
Instance details

Defined in Amazonka.Lambda.Types.LastUpdateStatusReasonCode

Associated Types

type Rep LastUpdateStatusReasonCode :: Type -> Type #

Generic Layer 
Instance details

Defined in Amazonka.Lambda.Types.Layer

Associated Types

type Rep Layer :: Type -> Type #

Methods

from :: Layer -> Rep Layer x #

to :: Rep Layer x -> Layer #

Generic LayerVersionContentInput 
Instance details

Defined in Amazonka.Lambda.Types.LayerVersionContentInput

Associated Types

type Rep LayerVersionContentInput :: Type -> Type #

Generic LayerVersionContentOutput 
Instance details

Defined in Amazonka.Lambda.Types.LayerVersionContentOutput

Associated Types

type Rep LayerVersionContentOutput :: Type -> Type #

Generic LayerVersionsListItem 
Instance details

Defined in Amazonka.Lambda.Types.LayerVersionsListItem

Associated Types

type Rep LayerVersionsListItem :: Type -> Type #

Generic LayersListItem 
Instance details

Defined in Amazonka.Lambda.Types.LayersListItem

Associated Types

type Rep LayersListItem :: Type -> Type #

Generic LogType 
Instance details

Defined in Amazonka.Lambda.Types.LogType

Associated Types

type Rep LogType :: Type -> Type #

Methods

from :: LogType -> Rep LogType x #

to :: Rep LogType x -> LogType #

Generic OnFailure 
Instance details

Defined in Amazonka.Lambda.Types.OnFailure

Associated Types

type Rep OnFailure :: Type -> Type #

Generic OnSuccess 
Instance details

Defined in Amazonka.Lambda.Types.OnSuccess

Associated Types

type Rep OnSuccess :: Type -> Type #

Generic PackageType 
Instance details

Defined in Amazonka.Lambda.Types.PackageType

Associated Types

type Rep PackageType :: Type -> Type #

Generic ProvisionedConcurrencyConfigListItem 
Instance details

Defined in Amazonka.Lambda.Types.ProvisionedConcurrencyConfigListItem

Generic ProvisionedConcurrencyStatusEnum 
Instance details

Defined in Amazonka.Lambda.Types.ProvisionedConcurrencyStatusEnum

Associated Types

type Rep ProvisionedConcurrencyStatusEnum :: Type -> Type #

Generic Runtime 
Instance details

Defined in Amazonka.Lambda.Types.Runtime

Associated Types

type Rep Runtime :: Type -> Type #

Methods

from :: Runtime -> Rep Runtime x #

to :: Rep Runtime x -> Runtime #

Generic SelfManagedEventSource 
Instance details

Defined in Amazonka.Lambda.Types.SelfManagedEventSource

Associated Types

type Rep SelfManagedEventSource :: Type -> Type #

Generic SelfManagedKafkaEventSourceConfig 
Instance details

Defined in Amazonka.Lambda.Types.SelfManagedKafkaEventSourceConfig

Associated Types

type Rep SelfManagedKafkaEventSourceConfig :: Type -> Type #

Generic SnapStart 
Instance details

Defined in Amazonka.Lambda.Types.SnapStart

Associated Types

type Rep SnapStart :: Type -> Type #

Generic SnapStartApplyOn 
Instance details

Defined in Amazonka.Lambda.Types.SnapStartApplyOn

Associated Types

type Rep SnapStartApplyOn :: Type -> Type #

Generic SnapStartOptimizationStatus 
Instance details

Defined in Amazonka.Lambda.Types.SnapStartOptimizationStatus

Associated Types

type Rep SnapStartOptimizationStatus :: Type -> Type #

Generic SnapStartResponse 
Instance details

Defined in Amazonka.Lambda.Types.SnapStartResponse

Associated Types

type Rep SnapStartResponse :: Type -> Type #

Generic SourceAccessConfiguration 
Instance details

Defined in Amazonka.Lambda.Types.SourceAccessConfiguration

Associated Types

type Rep SourceAccessConfiguration :: Type -> Type #

Generic SourceAccessType 
Instance details

Defined in Amazonka.Lambda.Types.SourceAccessType

Associated Types

type Rep SourceAccessType :: Type -> Type #

Generic State 
Instance details

Defined in Amazonka.Lambda.Types.State

Associated Types

type Rep State :: Type -> Type #

Methods

from :: State -> Rep State x #

to :: Rep State x -> State #

Generic StateReasonCode 
Instance details

Defined in Amazonka.Lambda.Types.StateReasonCode

Associated Types

type Rep StateReasonCode :: Type -> Type #

Generic TracingConfig 
Instance details

Defined in Amazonka.Lambda.Types.TracingConfig

Associated Types

type Rep TracingConfig :: Type -> Type #

Generic TracingConfigResponse 
Instance details

Defined in Amazonka.Lambda.Types.TracingConfigResponse

Associated Types

type Rep TracingConfigResponse :: Type -> Type #

Generic TracingMode 
Instance details

Defined in Amazonka.Lambda.Types.TracingMode

Associated Types

type Rep TracingMode :: Type -> Type #

Generic VpcConfig 
Instance details

Defined in Amazonka.Lambda.Types.VpcConfig

Associated Types

type Rep VpcConfig :: Type -> Type #

Generic VpcConfigResponse 
Instance details

Defined in Amazonka.Lambda.Types.VpcConfigResponse

Associated Types

type Rep VpcConfigResponse :: Type -> Type #

Generic GetRoleCredentials 
Instance details

Defined in Amazonka.SSO.GetRoleCredentials

Associated Types

type Rep GetRoleCredentials :: Type -> Type #

Generic GetRoleCredentialsResponse 
Instance details

Defined in Amazonka.SSO.GetRoleCredentials

Associated Types

type Rep GetRoleCredentialsResponse :: Type -> Type #

Generic ListAccountRoles 
Instance details

Defined in Amazonka.SSO.ListAccountRoles

Associated Types

type Rep ListAccountRoles :: Type -> Type #

Generic ListAccountRolesResponse 
Instance details

Defined in Amazonka.SSO.ListAccountRoles

Associated Types

type Rep ListAccountRolesResponse :: Type -> Type #

Generic ListAccounts 
Instance details

Defined in Amazonka.SSO.ListAccounts

Associated Types

type Rep ListAccounts :: Type -> Type #

Generic ListAccountsResponse 
Instance details

Defined in Amazonka.SSO.ListAccounts

Associated Types

type Rep ListAccountsResponse :: Type -> Type #

Generic Logout 
Instance details

Defined in Amazonka.SSO.Logout

Associated Types

type Rep Logout :: Type -> Type #

Methods

from :: Logout -> Rep Logout x #

to :: Rep Logout x -> Logout #

Generic LogoutResponse 
Instance details

Defined in Amazonka.SSO.Logout

Associated Types

type Rep LogoutResponse :: Type -> Type #

Generic AccountInfo 
Instance details

Defined in Amazonka.SSO.Types.AccountInfo

Associated Types

type Rep AccountInfo :: Type -> Type #

Generic RoleCredentials 
Instance details

Defined in Amazonka.SSO.Types.RoleCredentials

Associated Types

type Rep RoleCredentials :: Type -> Type #

Generic RoleInfo 
Instance details

Defined in Amazonka.SSO.Types.RoleInfo

Associated Types

type Rep RoleInfo :: Type -> Type #

Methods

from :: RoleInfo -> Rep RoleInfo x #

to :: Rep RoleInfo x -> RoleInfo #

Generic AssumeRole 
Instance details

Defined in Amazonka.STS.AssumeRole

Associated Types

type Rep AssumeRole :: Type -> Type #

Generic AssumeRoleResponse 
Instance details

Defined in Amazonka.STS.AssumeRole

Associated Types

type Rep AssumeRoleResponse :: Type -> Type #

Generic AssumeRoleWithSAML 
Instance details

Defined in Amazonka.STS.AssumeRoleWithSAML

Associated Types

type Rep AssumeRoleWithSAML :: Type -> Type #

Generic AssumeRoleWithSAMLResponse 
Instance details

Defined in Amazonka.STS.AssumeRoleWithSAML

Associated Types

type Rep AssumeRoleWithSAMLResponse :: Type -> Type #

Generic AssumeRoleWithWebIdentity 
Instance details

Defined in Amazonka.STS.AssumeRoleWithWebIdentity

Associated Types

type Rep AssumeRoleWithWebIdentity :: Type -> Type #

Generic AssumeRoleWithWebIdentityResponse 
Instance details

Defined in Amazonka.STS.AssumeRoleWithWebIdentity

Associated Types

type Rep AssumeRoleWithWebIdentityResponse :: Type -> Type #

Generic DecodeAuthorizationMessage 
Instance details

Defined in Amazonka.STS.DecodeAuthorizationMessage

Associated Types

type Rep DecodeAuthorizationMessage :: Type -> Type #

Generic DecodeAuthorizationMessageResponse 
Instance details

Defined in Amazonka.STS.DecodeAuthorizationMessage

Associated Types

type Rep DecodeAuthorizationMessageResponse :: Type -> Type #

Generic GetAccessKeyInfo 
Instance details

Defined in Amazonka.STS.GetAccessKeyInfo

Associated Types

type Rep GetAccessKeyInfo :: Type -> Type #

Generic GetAccessKeyInfoResponse 
Instance details

Defined in Amazonka.STS.GetAccessKeyInfo

Associated Types

type Rep GetAccessKeyInfoResponse :: Type -> Type #

Generic GetCallerIdentity 
Instance details

Defined in Amazonka.STS.GetCallerIdentity

Associated Types

type Rep GetCallerIdentity :: Type -> Type #

Generic GetCallerIdentityResponse 
Instance details

Defined in Amazonka.STS.GetCallerIdentity

Associated Types

type Rep GetCallerIdentityResponse :: Type -> Type #

Generic GetFederationToken 
Instance details

Defined in Amazonka.STS.GetFederationToken

Associated Types

type Rep GetFederationToken :: Type -> Type #

Generic GetFederationTokenResponse 
Instance details

Defined in Amazonka.STS.GetFederationToken

Associated Types

type Rep GetFederationTokenResponse :: Type -> Type #

Generic GetSessionToken 
Instance details

Defined in Amazonka.STS.GetSessionToken

Associated Types

type Rep GetSessionToken :: Type -> Type #

Generic GetSessionTokenResponse 
Instance details

Defined in Amazonka.STS.GetSessionToken

Associated Types

type Rep GetSessionTokenResponse :: Type -> Type #

Generic AssumedRoleUser 
Instance details

Defined in Amazonka.STS.Types.AssumedRoleUser

Associated Types

type Rep AssumedRoleUser :: Type -> Type #

Generic FederatedUser 
Instance details

Defined in Amazonka.STS.Types.FederatedUser

Associated Types

type Rep FederatedUser :: Type -> Type #

Generic PolicyDescriptorType 
Instance details

Defined in Amazonka.STS.Types.PolicyDescriptorType

Associated Types

type Rep PolicyDescriptorType :: Type -> Type #

Generic Tag 
Instance details

Defined in Amazonka.STS.Types.Tag

Associated Types

type Rep Tag :: Type -> Type #

Methods

from :: Tag -> Rep Tag x #

to :: Rep Tag x -> Tag #

Generic All 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep All :: Type -> Type #

Methods

from :: All -> Rep All x #

to :: Rep All x -> All #

Generic Any 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep Any :: Type -> Type #

Methods

from :: Any -> Rep Any x #

to :: Rep Any x -> Any #

Generic Version 
Instance details

Defined in Data.Version

Associated Types

type Rep Version :: Type -> Type #

Methods

from :: Version -> Rep Version x #

to :: Rep Version x -> Version #

Generic Void 
Instance details

Defined in Data.Void

Associated Types

type Rep Void :: Type -> Type #

Methods

from :: Void -> Rep Void x #

to :: Rep Void x -> Void #

Generic Fingerprint 
Instance details

Defined in GHC.Generics

Associated Types

type Rep Fingerprint :: Type -> Type #

Generic Associativity 
Instance details

Defined in GHC.Generics

Associated Types

type Rep Associativity :: Type -> Type #

Generic DecidedStrictness 
Instance details

Defined in GHC.Generics

Associated Types

type Rep DecidedStrictness :: Type -> Type #

Generic Fixity 
Instance details

Defined in GHC.Generics

Associated Types

type Rep Fixity :: Type -> Type #

Methods

from :: Fixity -> Rep Fixity x #

to :: Rep Fixity x -> Fixity #

Generic SourceStrictness 
Instance details

Defined in GHC.Generics

Associated Types

type Rep SourceStrictness :: Type -> Type #

Generic SourceUnpackedness 
Instance details

Defined in GHC.Generics

Associated Types

type Rep SourceUnpackedness :: Type -> Type #

Generic ExitCode 
Instance details

Defined in GHC.IO.Exception

Associated Types

type Rep ExitCode :: Type -> Type #

Methods

from :: ExitCode -> Rep ExitCode x #

to :: Rep ExitCode x -> ExitCode #

Generic CCFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep CCFlags :: Type -> Type #

Methods

from :: CCFlags -> Rep CCFlags x #

to :: Rep CCFlags x -> CCFlags #

Generic ConcFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep ConcFlags :: Type -> Type #

Generic DebugFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep DebugFlags :: Type -> Type #

Generic DoCostCentres 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep DoCostCentres :: Type -> Type #

Generic DoHeapProfile 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep DoHeapProfile :: Type -> Type #

Generic DoTrace 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep DoTrace :: Type -> Type #

Methods

from :: DoTrace -> Rep DoTrace x #

to :: Rep DoTrace x -> DoTrace #

Generic GCFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep GCFlags :: Type -> Type #

Methods

from :: GCFlags -> Rep GCFlags x #

to :: Rep GCFlags x -> GCFlags #

Generic GiveGCStats 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep GiveGCStats :: Type -> Type #

Generic MiscFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep MiscFlags :: Type -> Type #

Generic ParFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep ParFlags :: Type -> Type #

Methods

from :: ParFlags -> Rep ParFlags x #

to :: Rep ParFlags x -> ParFlags #

Generic ProfFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep ProfFlags :: Type -> Type #

Generic RTSFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep RTSFlags :: Type -> Type #

Methods

from :: RTSFlags -> Rep RTSFlags x #

to :: Rep RTSFlags x -> RTSFlags #

Generic TickyFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep TickyFlags :: Type -> Type #

Generic TraceFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep TraceFlags :: Type -> Type #

Generic SrcLoc 
Instance details

Defined in GHC.Generics

Associated Types

type Rep SrcLoc :: Type -> Type #

Methods

from :: SrcLoc -> Rep SrcLoc x #

to :: Rep SrcLoc x -> SrcLoc #

Generic GCDetails 
Instance details

Defined in GHC.Stats

Associated Types

type Rep GCDetails :: Type -> Type #

Generic RTSStats 
Instance details

Defined in GHC.Stats

Associated Types

type Rep RTSStats :: Type -> Type #

Methods

from :: RTSStats -> Rep RTSStats x #

to :: Rep RTSStats x -> RTSStats #

Generic GeneralCategory 
Instance details

Defined in GHC.Generics

Associated Types

type Rep GeneralCategory :: Type -> Type #

Generic NotFoundException 
Instance details

Defined in Context.Internal

Associated Types

type Rep NotFoundException :: Type -> Type #

Generic ForeignSrcLang 
Instance details

Defined in GHC.ForeignSrcLang.Type

Associated Types

type Rep ForeignSrcLang :: Type -> Type #

Generic Extension 
Instance details

Defined in GHC.LanguageExtensions.Type

Associated Types

type Rep Extension :: Type -> Type #

Generic Ordering 
Instance details

Defined in GHC.Generics

Associated Types

type Rep Ordering :: Type -> Type #

Methods

from :: Ordering -> Rep Ordering x #

to :: Rep Ordering x -> Ordering #

Generic IP 
Instance details

Defined in Data.IP.Addr

Associated Types

type Rep IP :: Type -> Type #

Methods

from :: IP -> Rep IP x #

to :: Rep IP x -> IP #

Generic IPv4 
Instance details

Defined in Data.IP.Addr

Associated Types

type Rep IPv4 :: Type -> Type #

Methods

from :: IPv4 -> Rep IPv4 x #

to :: Rep IPv4 x -> IPv4 #

Generic IPv6 
Instance details

Defined in Data.IP.Addr

Associated Types

type Rep IPv6 :: Type -> Type #

Methods

from :: IPv6 -> Rep IPv6 x #

to :: Rep IPv6 x -> IPv6 #

Generic IPRange 
Instance details

Defined in Data.IP.Range

Associated Types

type Rep IPRange :: Type -> Type #

Methods

from :: IPRange -> Rep IPRange x #

to :: Rep IPRange x -> IPRange #

Generic LoggedMessage 
Instance details

Defined in Control.Monad.Logger.Aeson.Internal

Associated Types

type Rep LoggedMessage :: Type -> Type #

Generic URI 
Instance details

Defined in Network.URI

Associated Types

type Rep URI :: Type -> Type #

Methods

from :: URI -> Rep URI x #

to :: Rep URI x -> URI #

Generic URIAuth 
Instance details

Defined in Network.URI

Associated Types

type Rep URIAuth :: Type -> Type #

Methods

from :: URIAuth -> Rep URIAuth x #

to :: Rep URIAuth x -> URIAuth #

Generic Mode 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Associated Types

type Rep Mode :: Type -> Type #

Methods

from :: Mode -> Rep Mode x #

to :: Rep Mode x -> Mode #

Generic Style 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Associated Types

type Rep Style :: Type -> Type #

Methods

from :: Style -> Rep Style x #

to :: Rep Style x -> Style #

Generic TextDetails 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Associated Types

type Rep TextDetails :: Type -> Type #

Generic Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Associated Types

type Rep Doc :: Type -> Type #

Methods

from :: Doc -> Rep Doc x #

to :: Rep Doc x -> Doc #

Generic RetryAction 
Instance details

Defined in Control.Retry

Associated Types

type Rep RetryAction :: Type -> Type #

Generic RetryStatus 
Instance details

Defined in Control.Retry

Associated Types

type Rep RetryStatus :: Type -> Type #

Generic LambdaError Source # 
Instance details

Defined in Stackctl.AWS.Lambda

Associated Types

type Rep LambdaError :: Type -> Type #

Generic AwsScope Source # 
Instance details

Defined in Stackctl.AWS.Scope

Associated Types

type Rep AwsScope :: Type -> Type #

Methods

from :: AwsScope -> Rep AwsScope x #

to :: Rep AwsScope x -> AwsScope #

Generic Action Source # 
Instance details

Defined in Stackctl.Action

Associated Types

type Rep Action :: Type -> Type #

Methods

from :: Action -> Rep Action x #

to :: Rep Action x -> Action #

Generic ActionOn Source # 
Instance details

Defined in Stackctl.Action

Associated Types

type Rep ActionOn :: Type -> Type #

Methods

from :: ActionOn -> Rep ActionOn x #

to :: Rep ActionOn x -> ActionOn #

Generic Config Source # 
Instance details

Defined in Stackctl.Config

Associated Types

type Rep Config :: Type -> Type #

Methods

from :: Config -> Rep Config x #

to :: Rep Config x -> Config #

Generic Options Source # 
Instance details

Defined in Stackctl.Options

Associated Types

type Rep Options :: Type -> Type #

Methods

from :: Options -> Rep Options x #

to :: Rep Options x -> Options #

Generic StackSpecYaml Source # 
Instance details

Defined in Stackctl.StackSpecYaml

Associated Types

type Rep StackSpecYaml :: Type -> Type #

Generic AnnLookup 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep AnnLookup :: Type -> Type #

Generic AnnTarget 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep AnnTarget :: Type -> Type #

Generic Bang 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Bang :: Type -> Type #

Methods

from :: Bang -> Rep Bang x #

to :: Rep Bang x -> Bang #

Generic Body 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Body :: Type -> Type #

Methods

from :: Body -> Rep Body x #

to :: Rep Body x -> Body #

Generic Bytes 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Bytes :: Type -> Type #

Methods

from :: Bytes -> Rep Bytes x #

to :: Rep Bytes x -> Bytes #

Generic Callconv 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Callconv :: Type -> Type #

Methods

from :: Callconv -> Rep Callconv x #

to :: Rep Callconv x -> Callconv #

Generic Clause 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Clause :: Type -> Type #

Methods

from :: Clause -> Rep Clause x #

to :: Rep Clause x -> Clause #

Generic Con 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Con :: Type -> Type #

Methods

from :: Con -> Rep Con x #

to :: Rep Con x -> Con #

Generic Dec 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Dec :: Type -> Type #

Methods

from :: Dec -> Rep Dec x #

to :: Rep Dec x -> Dec #

Generic DecidedStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep DecidedStrictness :: Type -> Type #

Generic DerivClause 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep DerivClause :: Type -> Type #

Generic DerivStrategy 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep DerivStrategy :: Type -> Type #

Generic DocLoc 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep DocLoc :: Type -> Type #

Methods

from :: DocLoc -> Rep DocLoc x #

to :: Rep DocLoc x -> DocLoc #

Generic Exp 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Exp :: Type -> Type #

Methods

from :: Exp -> Rep Exp x #

to :: Rep Exp x -> Exp #

Generic FamilyResultSig 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep FamilyResultSig :: Type -> Type #

Generic Fixity 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Fixity :: Type -> Type #

Methods

from :: Fixity -> Rep Fixity x #

to :: Rep Fixity x -> Fixity #

Generic FixityDirection 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep FixityDirection :: Type -> Type #

Generic Foreign 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Foreign :: Type -> Type #

Methods

from :: Foreign -> Rep Foreign x #

to :: Rep Foreign x -> Foreign #

Generic FunDep 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep FunDep :: Type -> Type #

Methods

from :: FunDep -> Rep FunDep x #

to :: Rep FunDep x -> FunDep #

Generic Guard 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Guard :: Type -> Type #

Methods

from :: Guard -> Rep Guard x #

to :: Rep Guard x -> Guard #

Generic Info 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Info :: Type -> Type #

Methods

from :: Info -> Rep Info x #

to :: Rep Info x -> Info #

Generic InjectivityAnn 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep InjectivityAnn :: Type -> Type #

Generic Inline 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Inline :: Type -> Type #

Methods

from :: Inline -> Rep Inline x #

to :: Rep Inline x -> Inline #

Generic Lit 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Lit :: Type -> Type #

Methods

from :: Lit -> Rep Lit x #

to :: Rep Lit x -> Lit #

Generic Loc 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Loc :: Type -> Type #

Methods

from :: Loc -> Rep Loc x #

to :: Rep Loc x -> Loc #

Generic Match 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Match :: Type -> Type #

Methods

from :: Match -> Rep Match x #

to :: Rep Match x -> Match #

Generic ModName 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep ModName :: Type -> Type #

Methods

from :: ModName -> Rep ModName x #

to :: Rep ModName x -> ModName #

Generic Module 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Module :: Type -> Type #

Methods

from :: Module -> Rep Module x #

to :: Rep Module x -> Module #

Generic ModuleInfo 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep ModuleInfo :: Type -> Type #

Generic Name 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Name :: Type -> Type #

Methods

from :: Name -> Rep Name x #

to :: Rep Name x -> Name #

Generic NameFlavour 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep NameFlavour :: Type -> Type #

Generic NameSpace 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep NameSpace :: Type -> Type #

Generic OccName 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep OccName :: Type -> Type #

Methods

from :: OccName -> Rep OccName x #

to :: Rep OccName x -> OccName #

Generic Overlap 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Overlap :: Type -> Type #

Methods

from :: Overlap -> Rep Overlap x #

to :: Rep Overlap x -> Overlap #

Generic Pat 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Pat :: Type -> Type #

Methods

from :: Pat -> Rep Pat x #

to :: Rep Pat x -> Pat #

Generic PatSynArgs 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep PatSynArgs :: Type -> Type #

Generic PatSynDir 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep PatSynDir :: Type -> Type #

Generic Phases 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Phases :: Type -> Type #

Methods

from :: Phases -> Rep Phases x #

to :: Rep Phases x -> Phases #

Generic PkgName 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep PkgName :: Type -> Type #

Methods

from :: PkgName -> Rep PkgName x #

to :: Rep PkgName x -> PkgName #

Generic Pragma 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Pragma :: Type -> Type #

Methods

from :: Pragma -> Rep Pragma x #

to :: Rep Pragma x -> Pragma #

Generic Range 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Range :: Type -> Type #

Methods

from :: Range -> Rep Range x #

to :: Rep Range x -> Range #

Generic Role 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Role :: Type -> Type #

Methods

from :: Role -> Rep Role x #

to :: Rep Role x -> Role #

Generic RuleBndr 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep RuleBndr :: Type -> Type #

Methods

from :: RuleBndr -> Rep RuleBndr x #

to :: Rep RuleBndr x -> RuleBndr #

Generic RuleMatch 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep RuleMatch :: Type -> Type #

Generic Safety 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Safety :: Type -> Type #

Methods

from :: Safety -> Rep Safety x #

to :: Rep Safety x -> Safety #

Generic SourceStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep SourceStrictness :: Type -> Type #

Generic SourceUnpackedness 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep SourceUnpackedness :: Type -> Type #

Generic Specificity 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Specificity :: Type -> Type #

Generic Stmt 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Stmt :: Type -> Type #

Methods

from :: Stmt -> Rep Stmt x #

to :: Rep Stmt x -> Stmt #

Generic TyLit 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep TyLit :: Type -> Type #

Methods

from :: TyLit -> Rep TyLit x #

to :: Rep TyLit x -> TyLit #

Generic TySynEqn 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep TySynEqn :: Type -> Type #

Methods

from :: TySynEqn -> Rep TySynEqn x #

to :: Rep TySynEqn x -> TySynEqn #

Generic Type 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Type :: Type -> Type #

Methods

from :: Type -> Rep Type x #

to :: Rep Type x -> Type #

Generic TypeFamilyHead 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep TypeFamilyHead :: Type -> Type #

Generic ConstructorInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep ConstructorInfo :: Type -> Type #

Generic ConstructorVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep ConstructorVariant :: Type -> Type #

Generic DatatypeInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep DatatypeInfo :: Type -> Type #

Generic DatatypeVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep DatatypeVariant :: Type -> Type #

Generic FieldStrictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep FieldStrictness :: Type -> Type #

Generic Strictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep Strictness :: Type -> Type #

Generic Unpackedness 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep Unpackedness :: Type -> Type #

Generic ConcException 
Instance details

Defined in UnliftIO.Internals.Async

Associated Types

type Rep ConcException :: Type -> Type #

Generic Content 
Instance details

Defined in Data.XML.Types

Associated Types

type Rep Content :: Type -> Type #

Methods

from :: Content -> Rep Content x #

to :: Rep Content x -> Content #

Generic Doctype 
Instance details

Defined in Data.XML.Types

Associated Types

type Rep Doctype :: Type -> Type #

Methods

from :: Doctype -> Rep Doctype x #

to :: Rep Doctype x -> Doctype #

Generic Document 
Instance details

Defined in Data.XML.Types

Associated Types

type Rep Document :: Type -> Type #

Methods

from :: Document -> Rep Document x #

to :: Rep Document x -> Document #

Generic Element 
Instance details

Defined in Data.XML.Types

Associated Types

type Rep Element :: Type -> Type #

Methods

from :: Element -> Rep Element x #

to :: Rep Element x -> Element #

Generic Event 
Instance details

Defined in Data.XML.Types

Associated Types

type Rep Event :: Type -> Type #

Methods

from :: Event -> Rep Event x #

to :: Rep Event x -> Event #

Generic ExternalID 
Instance details

Defined in Data.XML.Types

Associated Types

type Rep ExternalID :: Type -> Type #

Generic Instruction 
Instance details

Defined in Data.XML.Types

Associated Types

type Rep Instruction :: Type -> Type #

Generic Miscellaneous 
Instance details

Defined in Data.XML.Types

Associated Types

type Rep Miscellaneous :: Type -> Type #

Generic Name 
Instance details

Defined in Data.XML.Types

Associated Types

type Rep Name :: Type -> Type #

Methods

from :: Name -> Rep Name x #

to :: Rep Name x -> Name #

Generic Node 
Instance details

Defined in Data.XML.Types

Associated Types

type Rep Node :: Type -> Type #

Methods

from :: Node -> Rep Node x #

to :: Rep Node x -> Node #

Generic Prologue 
Instance details

Defined in Data.XML.Types

Associated Types

type Rep Prologue :: Type -> Type #

Methods

from :: Prologue -> Rep Prologue x #

to :: Rep Prologue x -> Prologue #

Generic CompressionLevel 
Instance details

Defined in Codec.Compression.Zlib.Stream

Associated Types

type Rep CompressionLevel :: Type -> Type #

Generic CompressionStrategy 
Instance details

Defined in Codec.Compression.Zlib.Stream

Associated Types

type Rep CompressionStrategy :: Type -> Type #

Generic Format 
Instance details

Defined in Codec.Compression.Zlib.Stream

Associated Types

type Rep Format :: Type -> Type #

Methods

from :: Format -> Rep Format x #

to :: Rep Format x -> Format #

Generic MemoryLevel 
Instance details

Defined in Codec.Compression.Zlib.Stream

Associated Types

type Rep MemoryLevel :: Type -> Type #

Generic Method 
Instance details

Defined in Codec.Compression.Zlib.Stream

Associated Types

type Rep Method :: Type -> Type #

Methods

from :: Method -> Rep Method x #

to :: Rep Method x -> Method #

Generic WindowBits 
Instance details

Defined in Codec.Compression.Zlib.Stream

Associated Types

type Rep WindowBits :: Type -> Type #

Generic () 
Instance details

Defined in GHC.Generics

Associated Types

type Rep () :: Type -> Type #

Methods

from :: () -> Rep () x #

to :: Rep () x -> () #

Generic Bool 
Instance details

Defined in GHC.Generics

Associated Types

type Rep Bool :: Type -> Type #

Methods

from :: Bool -> Rep Bool x #

to :: Rep Bool x -> Bool #

Generic (Env' withAuth) 
Instance details

Defined in Amazonka.Env

Associated Types

type Rep (Env' withAuth) :: Type -> Type #

Methods

from :: Env' withAuth -> Rep (Env' withAuth) x #

to :: Rep (Env' withAuth) x -> Env' withAuth #

Generic (Sensitive a) 
Instance details

Defined in Amazonka.Data.Sensitive

Associated Types

type Rep (Sensitive a) :: Type -> Type #

Methods

from :: Sensitive a -> Rep (Sensitive a) x #

to :: Rep (Sensitive a) x -> Sensitive a #

Generic (Time a) 
Instance details

Defined in Amazonka.Data.Time

Associated Types

type Rep (Time a) :: Type -> Type #

Methods

from :: Time a -> Rep (Time a) x #

to :: Rep (Time a) x -> Time a #

Generic (Request a) 
Instance details

Defined in Amazonka.Types

Associated Types

type Rep (Request a) :: Type -> Type #

Methods

from :: Request a -> Rep (Request a) x #

to :: Rep (Request a) x -> Request a #

Generic (ZipList a) 
Instance details

Defined in Control.Applicative

Associated Types

type Rep (ZipList a) :: Type -> Type #

Methods

from :: ZipList a -> Rep (ZipList a) x #

to :: Rep (ZipList a) x -> ZipList a #

Generic (Complex a) 
Instance details

Defined in Data.Complex

Associated Types

type Rep (Complex a) :: Type -> Type #

Methods

from :: Complex a -> Rep (Complex a) x #

to :: Rep (Complex a) x -> Complex a #

Generic (Identity a) 
Instance details

Defined in Data.Functor.Identity

Associated Types

type Rep (Identity a) :: Type -> Type #

Methods

from :: Identity a -> Rep (Identity a) x #

to :: Rep (Identity a) x -> Identity a #

Generic (First a) 
Instance details

Defined in Data.Monoid

Associated Types

type Rep (First a) :: Type -> Type #

Methods

from :: First a -> Rep (First a) x #

to :: Rep (First a) x -> First a #

Generic (Last a) 
Instance details

Defined in Data.Monoid

Associated Types

type Rep (Last a) :: Type -> Type #

Methods

from :: Last a -> Rep (Last a) x #

to :: Rep (Last a) x -> Last a #

Generic (Down a) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Down a) :: Type -> Type #

Methods

from :: Down a -> Rep (Down a) x #

to :: Rep (Down a) x -> Down a #

Generic (First a) 
Instance details

Defined in Data.Semigroup

Associated Types

type Rep (First a) :: Type -> Type #

Methods

from :: First a -> Rep (First a) x #

to :: Rep (First a) x -> First a #

Generic (Last a) 
Instance details

Defined in Data.Semigroup

Associated Types

type Rep (Last a) :: Type -> Type #

Methods

from :: Last a -> Rep (Last a) x #

to :: Rep (Last a) x -> Last a #

Generic (Max a) 
Instance details

Defined in Data.Semigroup

Associated Types

type Rep (Max a) :: Type -> Type #

Methods

from :: Max a -> Rep (Max a) x #

to :: Rep (Max a) x -> Max a #

Generic (Min a) 
Instance details

Defined in Data.Semigroup

Associated Types

type Rep (Min a) :: Type -> Type #

Methods

from :: Min a -> Rep (Min a) x #

to :: Rep (Min a) x -> Min a #

Generic (WrappedMonoid m) 
Instance details

Defined in Data.Semigroup

Associated Types

type Rep (WrappedMonoid m) :: Type -> Type #

Generic (Dual a) 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep (Dual a) :: Type -> Type #

Methods

from :: Dual a -> Rep (Dual a) x #

to :: Rep (Dual a) x -> Dual a #

Generic (Endo a) 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep (Endo a) :: Type -> Type #

Methods

from :: Endo a -> Rep (Endo a) x #

to :: Rep (Endo a) x -> Endo a #

Generic (Product a) 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep (Product a) :: Type -> Type #

Methods

from :: Product a -> Rep (Product a) x #

to :: Rep (Product a) x -> Product a #

Generic (Sum a) 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep (Sum a) :: Type -> Type #

Methods

from :: Sum a -> Rep (Sum a) x #

to :: Rep (Sum a) x -> Sum a #

Generic (Par1 p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Par1 p) :: Type -> Type #

Methods

from :: Par1 p -> Rep (Par1 p) x #

to :: Rep (Par1 p) x -> Par1 p #

Generic (SCC vertex) 
Instance details

Defined in Data.Graph

Associated Types

type Rep (SCC vertex) :: Type -> Type #

Methods

from :: SCC vertex -> Rep (SCC vertex) x #

to :: Rep (SCC vertex) x -> SCC vertex #

Generic (Digit a) 
Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep (Digit a) :: Type -> Type #

Methods

from :: Digit a -> Rep (Digit a) x #

to :: Rep (Digit a) x -> Digit a #

Generic (Elem a) 
Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep (Elem a) :: Type -> Type #

Methods

from :: Elem a -> Rep (Elem a) x #

to :: Rep (Elem a) x -> Elem a #

Generic (FingerTree a) 
Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep (FingerTree a) :: Type -> Type #

Methods

from :: FingerTree a -> Rep (FingerTree a) x #

to :: Rep (FingerTree a) x -> FingerTree a #

Generic (Node a) 
Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep (Node a) :: Type -> Type #

Methods

from :: Node a -> Rep (Node a) x #

to :: Rep (Node a) x -> Node a #

Generic (ViewL a) 
Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep (ViewL a) :: Type -> Type #

Methods

from :: ViewL a -> Rep (ViewL a) x #

to :: Rep (ViewL a) x -> ViewL a #

Generic (ViewR a) 
Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep (ViewR a) :: Type -> Type #

Methods

from :: ViewR a -> Rep (ViewR a) x #

to :: Rep (ViewR a) x -> ViewR a #

Generic (Tree a) 
Instance details

Defined in Data.Tree

Associated Types

type Rep (Tree a) :: Type -> Type #

Methods

from :: Tree a -> Rep (Tree a) x #

to :: Rep (Tree a) x -> Tree a #

Generic (Fix f) 
Instance details

Defined in Data.Fix

Associated Types

type Rep (Fix f) :: Type -> Type #

Methods

from :: Fix f -> Rep (Fix f) x #

to :: Rep (Fix f) x -> Fix f #

Generic (HistoriedResponse body) 
Instance details

Defined in Network.HTTP.Client

Associated Types

type Rep (HistoriedResponse body) :: Type -> Type #

Methods

from :: HistoriedResponse body -> Rep (HistoriedResponse body) x #

to :: Rep (HistoriedResponse body) x -> HistoriedResponse body #

Generic (AddrRange a) 
Instance details

Defined in Data.IP.Range

Associated Types

type Rep (AddrRange a) :: Type -> Type #

Methods

from :: AddrRange a -> Rep (AddrRange a) x #

to :: Rep (AddrRange a) x -> AddrRange a #

Generic (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Associated Types

type Rep (Doc a) :: Type -> Type #

Methods

from :: Doc a -> Rep (Doc a) x #

to :: Rep (Doc a) x -> Doc a #

Generic (Doc ann) 
Instance details

Defined in Prettyprinter.Internal

Associated Types

type Rep (Doc ann) :: Type -> Type #

Methods

from :: Doc ann -> Rep (Doc ann) x #

to :: Rep (Doc ann) x -> Doc ann #

Generic (SimpleDocStream ann) 
Instance details

Defined in Prettyprinter.Internal

Associated Types

type Rep (SimpleDocStream ann) :: Type -> Type #

Methods

from :: SimpleDocStream ann -> Rep (SimpleDocStream ann) x #

to :: Rep (SimpleDocStream ann) x -> SimpleDocStream ann #

Generic (OneOrListOf a) Source # 
Instance details

Defined in Stackctl.OneOrListOf

Associated Types

type Rep (OneOrListOf a) :: Type -> Type #

Methods

from :: OneOrListOf a -> Rep (OneOrListOf a) x #

to :: Rep (OneOrListOf a) x -> OneOrListOf a #

Generic (Maybe a) 
Instance details

Defined in Data.Strict.Maybe

Associated Types

type Rep (Maybe a) :: Type -> Type #

Methods

from :: Maybe a -> Rep (Maybe a) x #

to :: Rep (Maybe a) x -> Maybe a #

Generic (TyVarBndr flag) 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep (TyVarBndr flag) :: Type -> Type #

Methods

from :: TyVarBndr flag -> Rep (TyVarBndr flag) x #

to :: Rep (TyVarBndr flag) x -> TyVarBndr flag #

Generic (NonEmpty a) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (NonEmpty a) :: Type -> Type #

Methods

from :: NonEmpty a -> Rep (NonEmpty a) x #

to :: Rep (NonEmpty a) x -> NonEmpty a #

Generic (Maybe a) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Maybe a) :: Type -> Type #

Methods

from :: Maybe a -> Rep (Maybe a) x #

to :: Rep (Maybe a) x -> Maybe a #

Generic (a) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a) :: Type -> Type #

Methods

from :: (a) -> Rep (a) x #

to :: Rep (a) x -> (a) #

Generic [a] 
Instance details

Defined in GHC.Generics

Associated Types

type Rep [a] :: Type -> Type #

Methods

from :: [a] -> Rep [a] x #

to :: Rep [a] x -> [a] #

Generic (WrappedMonad m a) 
Instance details

Defined in Control.Applicative

Associated Types

type Rep (WrappedMonad m a) :: Type -> Type #

Methods

from :: WrappedMonad m a -> Rep (WrappedMonad m a) x #

to :: Rep (WrappedMonad m a) x -> WrappedMonad m a #

Generic (Either a b) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Either a b) :: Type -> Type #

Methods

from :: Either a b -> Rep (Either a b) x #

to :: Rep (Either a b) x -> Either a b #

Generic (Proxy t) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Proxy t) :: Type -> Type #

Methods

from :: Proxy t -> Rep (Proxy t) x #

to :: Rep (Proxy t) x -> Proxy t #

Generic (Arg a b) 
Instance details

Defined in Data.Semigroup

Associated Types

type Rep (Arg a b) :: Type -> Type #

Methods

from :: Arg a b -> Rep (Arg a b) x #

to :: Rep (Arg a b) x -> Arg a b #

Generic (U1 p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (U1 p) :: Type -> Type #

Methods

from :: U1 p -> Rep (U1 p) x #

to :: Rep (U1 p) x -> U1 p #

Generic (V1 p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (V1 p) :: Type -> Type #

Methods

from :: V1 p -> Rep (V1 p) x #

to :: Rep (V1 p) x -> V1 p #

Generic (Cofree f a) 
Instance details

Defined in Control.Comonad.Cofree

Associated Types

type Rep (Cofree f a) :: Type -> Type #

Methods

from :: Cofree f a -> Rep (Cofree f a) x #

to :: Rep (Cofree f a) x -> Cofree f a #

Generic (Free f a) 
Instance details

Defined in Control.Monad.Free

Associated Types

type Rep (Free f a) :: Type -> Type #

Methods

from :: Free f a -> Rep (Free f a) x #

to :: Rep (Free f a) x -> Free f a #

Generic (Either a b) 
Instance details

Defined in Data.Strict.Either

Associated Types

type Rep (Either a b) :: Type -> Type #

Methods

from :: Either a b -> Rep (Either a b) x #

to :: Rep (Either a b) x -> Either a b #

Generic (These a b) 
Instance details

Defined in Data.Strict.These

Associated Types

type Rep (These a b) :: Type -> Type #

Methods

from :: These a b -> Rep (These a b) x #

to :: Rep (These a b) x -> These a b #

Generic (Pair a b) 
Instance details

Defined in Data.Strict.Tuple

Associated Types

type Rep (Pair a b) :: Type -> Type #

Methods

from :: Pair a b -> Rep (Pair a b) x #

to :: Rep (Pair a b) x -> Pair a b #

Generic (These a b) 
Instance details

Defined in Data.These

Associated Types

type Rep (These a b) :: Type -> Type #

Methods

from :: These a b -> Rep (These a b) x #

to :: Rep (These a b) x -> These a b #

Generic (a, b) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b) :: Type -> Type #

Methods

from :: (a, b) -> Rep (a, b) x #

to :: Rep (a, b) x -> (a, b) #

Generic (WrappedArrow a b c) 
Instance details

Defined in Control.Applicative

Associated Types

type Rep (WrappedArrow a b c) :: Type -> Type #

Methods

from :: WrappedArrow a b c -> Rep (WrappedArrow a b c) x #

to :: Rep (WrappedArrow a b c) x -> WrappedArrow a b c #

Generic (Kleisli m a b) 
Instance details

Defined in Control.Arrow

Associated Types

type Rep (Kleisli m a b) :: Type -> Type #

Methods

from :: Kleisli m a b -> Rep (Kleisli m a b) x #

to :: Rep (Kleisli m a b) x -> Kleisli m a b #

Generic (Const a b) 
Instance details

Defined in Data.Functor.Const

Associated Types

type Rep (Const a b) :: Type -> Type #

Methods

from :: Const a b -> Rep (Const a b) x #

to :: Rep (Const a b) x -> Const a b #

Generic (Ap f a) 
Instance details

Defined in Data.Monoid

Associated Types

type Rep (Ap f a) :: Type -> Type #

Methods

from :: Ap f a -> Rep (Ap f a) x #

to :: Rep (Ap f a) x -> Ap f a #

Generic (Alt f a) 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep (Alt f a) :: Type -> Type #

Methods

from :: Alt f a -> Rep (Alt f a) x #

to :: Rep (Alt f a) x -> Alt f a #

Generic (Rec1 f p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Rec1 f p) :: Type -> Type #

Methods

from :: Rec1 f p -> Rep (Rec1 f p) x #

to :: Rep (Rec1 f p) x -> Rec1 f p #

Generic (URec (Ptr ()) p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec (Ptr ()) p) :: Type -> Type #

Methods

from :: URec (Ptr ()) p -> Rep (URec (Ptr ()) p) x #

to :: Rep (URec (Ptr ()) p) x -> URec (Ptr ()) p #

Generic (URec Char p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Char p) :: Type -> Type #

Methods

from :: URec Char p -> Rep (URec Char p) x #

to :: Rep (URec Char p) x -> URec Char p #

Generic (URec Double p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Double p) :: Type -> Type #

Methods

from :: URec Double p -> Rep (URec Double p) x #

to :: Rep (URec Double p) x -> URec Double p #

Generic (URec Float p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Float p) :: Type -> Type #

Methods

from :: URec Float p -> Rep (URec Float p) x #

to :: Rep (URec Float p) x -> URec Float p #

Generic (URec Int p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Int p) :: Type -> Type #

Methods

from :: URec Int p -> Rep (URec Int p) x #

to :: Rep (URec Int p) x -> URec Int p #

Generic (URec Word p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Word p) :: Type -> Type #

Methods

from :: URec Word p -> Rep (URec Word p) x #

to :: Rep (URec Word p) x -> URec Word p #

Generic (Fix p a) 
Instance details

Defined in Data.Bifunctor.Fix

Associated Types

type Rep (Fix p a) :: Type -> Type #

Methods

from :: Fix p a -> Rep (Fix p a) x #

to :: Rep (Fix p a) x -> Fix p a #

Generic (Join p a) 
Instance details

Defined in Data.Bifunctor.Join

Associated Types

type Rep (Join p a) :: Type -> Type #

Methods

from :: Join p a -> Rep (Join p a) x #

to :: Rep (Join p a) x -> Join p a #

Generic (CofreeF f a b) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Associated Types

type Rep (CofreeF f a b) :: Type -> Type #

Methods

from :: CofreeF f a b -> Rep (CofreeF f a b) x #

to :: Rep (CofreeF f a b) x -> CofreeF f a b #

Generic (FreeF f a b) 
Instance details

Defined in Control.Monad.Trans.Free

Associated Types

type Rep (FreeF f a b) :: Type -> Type #

Methods

from :: FreeF f a b -> Rep (FreeF f a b) x #

to :: Rep (FreeF f a b) x -> FreeF f a b #

Generic (Tagged s b) 
Instance details

Defined in Data.Tagged

Associated Types

type Rep (Tagged s b) :: Type -> Type #

Methods

from :: Tagged s b -> Rep (Tagged s b) x #

to :: Rep (Tagged s b) x -> Tagged s b #

Generic (These1 f g a) 
Instance details

Defined in Data.Functor.These

Associated Types

type Rep (These1 f g a) :: Type -> Type #

Methods

from :: These1 f g a -> Rep (These1 f g a) x #

to :: Rep (These1 f g a) x -> These1 f g a #

Generic (a, b, c) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c) :: Type -> Type #

Methods

from :: (a, b, c) -> Rep (a, b, c) x #

to :: Rep (a, b, c) x -> (a, b, c) #

Generic (Product f g a) 
Instance details

Defined in Data.Functor.Product

Associated Types

type Rep (Product f g a) :: Type -> Type #

Methods

from :: Product f g a -> Rep (Product f g a) x #

to :: Rep (Product f g a) x -> Product f g a #

Generic (Sum f g a) 
Instance details

Defined in Data.Functor.Sum

Associated Types

type Rep (Sum f g a) :: Type -> Type #

Methods

from :: Sum f g a -> Rep (Sum f g a) x #

to :: Rep (Sum f g a) x -> Sum f g a #

Generic ((f :*: g) p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep ((f :*: g) p) :: Type -> Type #

Methods

from :: (f :*: g) p -> Rep ((f :*: g) p) x #

to :: Rep ((f :*: g) p) x -> (f :*: g) p #

Generic ((f :+: g) p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep ((f :+: g) p) :: Type -> Type #

Methods

from :: (f :+: g) p -> Rep ((f :+: g) p) x #

to :: Rep ((f :+: g) p) x -> (f :+: g) p #

Generic (K1 i c p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (K1 i c p) :: Type -> Type #

Methods

from :: K1 i c p -> Rep (K1 i c p) x #

to :: Rep (K1 i c p) x -> K1 i c p #

Generic (a, b, c, d) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d) :: Type -> Type #

Methods

from :: (a, b, c, d) -> Rep (a, b, c, d) x #

to :: Rep (a, b, c, d) x -> (a, b, c, d) #

Generic (Compose f g a) 
Instance details

Defined in Data.Functor.Compose

Associated Types

type Rep (Compose f g a) :: Type -> Type #

Methods

from :: Compose f g a -> Rep (Compose f g a) x #

to :: Rep (Compose f g a) x -> Compose f g a #

Generic ((f :.: g) p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep ((f :.: g) p) :: Type -> Type #

Methods

from :: (f :.: g) p -> Rep ((f :.: g) p) x #

to :: Rep ((f :.: g) p) x -> (f :.: g) p #

Generic (M1 i c f p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (M1 i c f p) :: Type -> Type #

Methods

from :: M1 i c f p -> Rep (M1 i c f p) x #

to :: Rep (M1 i c f p) x -> M1 i c f p #

Generic (Clown f a b) 
Instance details

Defined in Data.Bifunctor.Clown

Associated Types

type Rep (Clown f a b) :: Type -> Type #

Methods

from :: Clown f a b -> Rep (Clown f a b) x #

to :: Rep (Clown f a b) x -> Clown f a b #

Generic (Flip p a b) 
Instance details

Defined in Data.Bifunctor.Flip

Associated Types

type Rep (Flip p a b) :: Type -> Type #

Methods

from :: Flip p a b -> Rep (Flip p a b) x #

to :: Rep (Flip p a b) x -> Flip p a b #

Generic (Joker g a b) 
Instance details

Defined in Data.Bifunctor.Joker

Associated Types

type Rep (Joker g a b) :: Type -> Type #

Methods

from :: Joker g a b -> Rep (Joker g a b) x #

to :: Rep (Joker g a b) x -> Joker g a b #

Generic (WrappedBifunctor p a b) 
Instance details

Defined in Data.Bifunctor.Wrapped

Associated Types

type Rep (WrappedBifunctor p a b) :: Type -> Type #

Methods

from :: WrappedBifunctor p a b -> Rep (WrappedBifunctor p a b) x #

to :: Rep (WrappedBifunctor p a b) x -> WrappedBifunctor p a b #

Generic (a, b, c, d, e) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e) :: Type -> Type #

Methods

from :: (a, b, c, d, e) -> Rep (a, b, c, d, e) x #

to :: Rep (a, b, c, d, e) x -> (a, b, c, d, e) #

Generic (Product f g a b) 
Instance details

Defined in Data.Bifunctor.Product

Associated Types

type Rep (Product f g a b) :: Type -> Type #

Methods

from :: Product f g a b -> Rep (Product f g a b) x #

to :: Rep (Product f g a b) x -> Product f g a b #

Generic (Sum p q a b) 
Instance details

Defined in Data.Bifunctor.Sum

Associated Types

type Rep (Sum p q a b) :: Type -> Type #

Methods

from :: Sum p q a b -> Rep (Sum p q a b) x #

to :: Rep (Sum p q a b) x -> Sum p q a b #

Generic (a, b, c, d, e, f) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e, f) :: Type -> Type #

Methods

from :: (a, b, c, d, e, f) -> Rep (a, b, c, d, e, f) x #

to :: Rep (a, b, c, d, e, f) x -> (a, b, c, d, e, f) #

Generic (Tannen f p a b) 
Instance details

Defined in Data.Bifunctor.Tannen

Associated Types

type Rep (Tannen f p a b) :: Type -> Type #

Methods

from :: Tannen f p a b -> Rep (Tannen f p a b) x #

to :: Rep (Tannen f p a b) x -> Tannen f p a b #

Generic (a, b, c, d, e, f, g) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e, f, g) :: Type -> Type #

Methods

from :: (a, b, c, d, e, f, g) -> Rep (a, b, c, d, e, f, g) x #

to :: Rep (a, b, c, d, e, f, g) x -> (a, b, c, d, e, f, g) #

Generic (a, b, c, d, e, f, g, h) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e, f, g, h) :: Type -> Type #

Methods

from :: (a, b, c, d, e, f, g, h) -> Rep (a, b, c, d, e, f, g, h) x #

to :: Rep (a, b, c, d, e, f, g, h) x -> (a, b, c, d, e, f, g, h) #

Generic (Biff p f g a b) 
Instance details

Defined in Data.Bifunctor.Biff

Associated Types

type Rep (Biff p f g a b) :: Type -> Type #

Methods

from :: Biff p f g a b -> Rep (Biff p f g a b) x #

to :: Rep (Biff p f g a b) x -> Biff p f g a b #

Generic (a, b, c, d, e, f, g, h, i) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e, f, g, h, i) :: Type -> Type #

Methods

from :: (a, b, c, d, e, f, g, h, i) -> Rep (a, b, c, d, e, f, g, h, i) x #

to :: Rep (a, b, c, d, e, f, g, h, i) x -> (a, b, c, d, e, f, g, h, i) #

Generic (a, b, c, d, e, f, g, h, i, j) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e, f, g, h, i, j) :: Type -> Type #

Methods

from :: (a, b, c, d, e, f, g, h, i, j) -> Rep (a, b, c, d, e, f, g, h, i, j) x #

to :: Rep (a, b, c, d, e, f, g, h, i, j) x -> (a, b, c, d, e, f, g, h, i, j) #

Generic (a, b, c, d, e, f, g, h, i, j, k) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e, f, g, h, i, j, k) :: Type -> Type #

Methods

from :: (a, b, c, d, e, f, g, h, i, j, k) -> Rep (a, b, c, d, e, f, g, h, i, j, k) x #

to :: Rep (a, b, c, d, e, f, g, h, i, j, k) x -> (a, b, c, d, e, f, g, h, i, j, k) #

Generic (a, b, c, d, e, f, g, h, i, j, k, l) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e, f, g, h, i, j, k, l) :: Type -> Type #

Methods

from :: (a, b, c, d, e, f, g, h, i, j, k, l) -> Rep (a, b, c, d, e, f, g, h, i, j, k, l) x #

to :: Rep (a, b, c, d, e, f, g, h, i, j, k, l) x -> (a, b, c, d, e, f, g, h, i, j, k, l) #

Generic (a, b, c, d, e, f, g, h, i, j, k, l, m) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e, f, g, h, i, j, k, l, m) :: Type -> Type #

Methods

from :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Rep (a, b, c, d, e, f, g, h, i, j, k, l, m) x #

to :: Rep (a, b, c, d, e, f, g, h, i, j, k, l, m) x -> (a, b, c, d, e, f, g, h, i, j, k, l, m) #

Generic (a, b, c, d, e, f, g, h, i, j, k, l, m, n) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n) :: Type -> Type #

Methods

from :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n) x #

to :: Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n) x -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) #

Generic (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) :: Type -> Type #

Methods

from :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) x #

to :: Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) x -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) #

class Semigroup a where #

The class of semigroups (types with an associative binary operation).

Instances should satisfy the following:

Associativity
x <> (y <> z) = (x <> y) <> z

Since: base-4.9.0.0

Methods

(<>) :: a -> a -> a infixr 6 #

An associative operation.

>>> [1,2,3] <> [4,5,6]
[1,2,3,4,5,6]

Instances

Instances details
Semigroup Pattern 
Instance details

Defined in System.FilePath.Glob.Base

Semigroup Series 
Instance details

Defined in Data.Aeson.Encoding.Internal

Semigroup Key 
Instance details

Defined in Data.Aeson.Key

Methods

(<>) :: Key -> Key -> Key #

sconcat :: NonEmpty Key -> Key #

stimes :: Integral b => b -> Key -> Key #

Semigroup RawPath 
Instance details

Defined in Amazonka.Data.Path

Semigroup QueryString 
Instance details

Defined in Amazonka.Data.Query

Semigroup More 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

(<>) :: More -> More -> More #

sconcat :: NonEmpty More -> More #

stimes :: Integral b => b -> More -> More #

Semigroup All

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

(<>) :: All -> All -> All #

sconcat :: NonEmpty All -> All #

stimes :: Integral b => b -> All -> All #

Semigroup Any

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

(<>) :: Any -> Any -> Any #

sconcat :: NonEmpty Any -> Any #

stimes :: Integral b => b -> Any -> Any #

Semigroup Void

Since: base-4.9.0.0

Instance details

Defined in Data.Void

Methods

(<>) :: Void -> Void -> Void #

sconcat :: NonEmpty Void -> Void #

stimes :: Integral b => b -> Void -> Void #

Semigroup String 
Instance details

Defined in Basement.UTF8.Base

Semigroup Builder 
Instance details

Defined in Data.ByteString.Builder.Internal

Semigroup ByteString 
Instance details

Defined in Data.ByteString.Internal

Semigroup ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Semigroup ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Semigroup IntSet

Since: containers-0.5.7

Instance details

Defined in Data.IntSet.Internal

Semigroup ByteArray 
Instance details

Defined in Data.Array.Byte

Semigroup LogStr 
Instance details

Defined in System.Log.FastLogger.LogStr

Semigroup Ordering

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Semigroup CookieJar 
Instance details

Defined in Network.HTTP.Client.Types

Semigroup RequestBody 
Instance details

Defined in Network.HTTP.Client.Types

Semigroup SeriesElem

Since: monad-logger-aeson-0.3.1.0

Instance details

Defined in Control.Monad.Logger.Aeson.Internal

Semigroup PrefsMod 
Instance details

Defined in Options.Applicative.Builder

Semigroup ParserHelp 
Instance details

Defined in Options.Applicative.Help.Types

Semigroup Completer 
Instance details

Defined in Options.Applicative.Types

Semigroup ParseError 
Instance details

Defined in Options.Applicative.Types

Semigroup Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Methods

(<>) :: Doc -> Doc -> Doc #

sconcat :: NonEmpty Doc -> Doc #

stimes :: Integral b => b -> Doc -> Doc #

Semigroup Utf8Builder 
Instance details

Defined in RIO.Prelude.Display

Semigroup LogFunc

Perform both sets of actions per log entry.

Since: rio-0.0.0.0

Instance details

Defined in RIO.Prelude.Logger

Semigroup AutoSSOOption Source # 
Instance details

Defined in Stackctl.AutoSSO

Semigroup ColorOption Source # 
Instance details

Defined in Stackctl.ColorOption

Semigroup DirectoryOption Source # 
Instance details

Defined in Stackctl.DirectoryOption

Semigroup FilterOption Source # 
Instance details

Defined in Stackctl.FilterOption

Semigroup Options Source # 
Instance details

Defined in Stackctl.Options

Semigroup ParametersYaml Source # 
Instance details

Defined in Stackctl.StackSpecYaml

Semigroup TagsYaml Source # 
Instance details

Defined in Stackctl.StackSpecYaml

Semigroup Verbosity Source # 
Instance details

Defined in Stackctl.VerboseOption

Semigroup ShortText 
Instance details

Defined in Data.Text.Short.Internal

Semigroup ()

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

(<>) :: () -> () -> () #

sconcat :: NonEmpty () -> () #

stimes :: Integral b => b -> () -> () #

Semigroup (KeyMap v) 
Instance details

Defined in Data.Aeson.KeyMap

Methods

(<>) :: KeyMap v -> KeyMap v -> KeyMap v #

sconcat :: NonEmpty (KeyMap v) -> KeyMap v #

stimes :: Integral b => b -> KeyMap v -> KeyMap v #

Semigroup (IResult a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

(<>) :: IResult a -> IResult a -> IResult a #

sconcat :: NonEmpty (IResult a) -> IResult a #

stimes :: Integral b => b -> IResult a -> IResult a #

Semigroup (Parser a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

(<>) :: Parser a -> Parser a -> Parser a #

sconcat :: NonEmpty (Parser a) -> Parser a #

stimes :: Integral b => b -> Parser a -> Parser a #

Semigroup (Result a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

(<>) :: Result a -> Result a -> Result a #

sconcat :: NonEmpty (Result a) -> Result a #

stimes :: Integral b => b -> Result a -> Result a #

Semigroup a => Semigroup (Sensitive a) 
Instance details

Defined in Amazonka.Data.Sensitive

Methods

(<>) :: Sensitive a -> Sensitive a -> Sensitive a #

sconcat :: NonEmpty (Sensitive a) -> Sensitive a #

stimes :: Integral b => b -> Sensitive a -> Sensitive a #

Semigroup a => Semigroup (Concurrently a)

Only defined by async for base >= 4.9

Since: async-2.1.0

Instance details

Defined in Control.Concurrent.Async

Semigroup (Comparison a)

(<>) on comparisons combines results with (<>) @Ordering. Without newtypes this equals liftA2 (liftA2 (<>)).

(<>) :: Comparison a -> Comparison a -> Comparison a
Comparison cmp <> Comparison cmp' = Comparison a a' ->
  cmp a a' <> cmp a a'
Instance details

Defined in Data.Functor.Contravariant

Semigroup (Equivalence a)

(<>) on equivalences uses logical conjunction (&&) on the results. Without newtypes this equals liftA2 (liftA2 (&&)).

(<>) :: Equivalence a -> Equivalence a -> Equivalence a
Equivalence equiv <> Equivalence equiv' = Equivalence a b ->
  equiv a b && equiv a b
Instance details

Defined in Data.Functor.Contravariant

Semigroup (Predicate a)

(<>) on predicates uses logical conjunction (&&) on the results. Without newtypes this equals liftA2 (&&).

(<>) :: Predicate a -> Predicate a -> Predicate a
Predicate pred <> Predicate pred' = Predicate a ->
  pred a && pred' a
Instance details

Defined in Data.Functor.Contravariant

Methods

(<>) :: Predicate a -> Predicate a -> Predicate a #

sconcat :: NonEmpty (Predicate a) -> Predicate a #

stimes :: Integral b => b -> Predicate a -> Predicate a #

Semigroup a => Semigroup (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

(<>) :: Identity a -> Identity a -> Identity a #

sconcat :: NonEmpty (Identity a) -> Identity a #

stimes :: Integral b => b -> Identity a -> Identity a #

Ord a => Semigroup (Max a)

Since: base-4.11.0.0

Instance details

Defined in Data.Functor.Utils

Methods

(<>) :: Max a -> Max a -> Max a #

sconcat :: NonEmpty (Max a) -> Max a #

stimes :: Integral b => b -> Max a -> Max a #

Ord a => Semigroup (Min a)

Since: base-4.11.0.0

Instance details

Defined in Data.Functor.Utils

Methods

(<>) :: Min a -> Min a -> Min a #

sconcat :: NonEmpty (Min a) -> Min a #

stimes :: Integral b => b -> Min a -> Min a #

Semigroup (First a)

Since: base-4.9.0.0

Instance details

Defined in Data.Monoid

Methods

(<>) :: First a -> First a -> First a #

sconcat :: NonEmpty (First a) -> First a #

stimes :: Integral b => b -> First a -> First a #

Semigroup (Last a)

Since: base-4.9.0.0

Instance details

Defined in Data.Monoid

Methods

(<>) :: Last a -> Last a -> Last a #

sconcat :: NonEmpty (Last a) -> Last a #

stimes :: Integral b => b -> Last a -> Last a #

Semigroup a => Semigroup (Down a)

Since: base-4.11.0.0

Instance details

Defined in Data.Ord

Methods

(<>) :: Down a -> Down a -> Down a #

sconcat :: NonEmpty (Down a) -> Down a #

stimes :: Integral b => b -> Down a -> Down a #

Semigroup (First a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(<>) :: First a -> First a -> First a #

sconcat :: NonEmpty (First a) -> First a #

stimes :: Integral b => b -> First a -> First a #

Semigroup (Last a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(<>) :: Last a -> Last a -> Last a #

sconcat :: NonEmpty (Last a) -> Last a #

stimes :: Integral b => b -> Last a -> Last a #

Ord a => Semigroup (Max a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(<>) :: Max a -> Max a -> Max a #

sconcat :: NonEmpty (Max a) -> Max a #

stimes :: Integral b => b -> Max a -> Max a #

Ord a => Semigroup (Min a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(<>) :: Min a -> Min a -> Min a #

sconcat :: NonEmpty (Min a) -> Min a #

stimes :: Integral b => b -> Min a -> Min a #

Monoid m => Semigroup (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Semigroup a => Semigroup (Dual a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

(<>) :: Dual a -> Dual a -> Dual a #

sconcat :: NonEmpty (Dual a) -> Dual a #

stimes :: Integral b => b -> Dual a -> Dual a #

Semigroup (Endo a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

(<>) :: Endo a -> Endo a -> Endo a #

sconcat :: NonEmpty (Endo a) -> Endo a #

stimes :: Integral b => b -> Endo a -> Endo a #

Num a => Semigroup (Product a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

(<>) :: Product a -> Product a -> Product a #

sconcat :: NonEmpty (Product a) -> Product a #

stimes :: Integral b => b -> Product a -> Product a #

Num a => Semigroup (Sum a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

(<>) :: Sum a -> Sum a -> Sum a #

sconcat :: NonEmpty (Sum a) -> Sum a #

stimes :: Integral b => b -> Sum a -> Sum a #

Semigroup p => Semigroup (Par1 p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

(<>) :: Par1 p -> Par1 p -> Par1 p #

sconcat :: NonEmpty (Par1 p) -> Par1 p #

stimes :: Integral b => b -> Par1 p -> Par1 p #

PrimType ty => Semigroup (Block ty) 
Instance details

Defined in Basement.Block.Base

Methods

(<>) :: Block ty -> Block ty -> Block ty #

sconcat :: NonEmpty (Block ty) -> Block ty #

stimes :: Integral b => b -> Block ty -> Block ty #

Semigroup (CountOf ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

(<>) :: CountOf ty -> CountOf ty -> CountOf ty #

sconcat :: NonEmpty (CountOf ty) -> CountOf ty #

stimes :: Integral b => b -> CountOf ty -> CountOf ty #

PrimType ty => Semigroup (UArray ty) 
Instance details

Defined in Basement.UArray.Base

Methods

(<>) :: UArray ty -> UArray ty -> UArray ty #

sconcat :: NonEmpty (UArray ty) -> UArray ty #

stimes :: Integral b => b -> UArray ty -> UArray ty #

Semigroup (IntMap a)

Since: containers-0.5.7

Instance details

Defined in Data.IntMap.Internal

Methods

(<>) :: IntMap a -> IntMap a -> IntMap a #

sconcat :: NonEmpty (IntMap a) -> IntMap a #

stimes :: Integral b => b -> IntMap a -> IntMap a #

Semigroup (Seq a)

Since: containers-0.5.7

Instance details

Defined in Data.Sequence.Internal

Methods

(<>) :: Seq a -> Seq a -> Seq a #

sconcat :: NonEmpty (Seq a) -> Seq a #

stimes :: Integral b => b -> Seq a -> Seq a #

Semigroup (MergeSet a) 
Instance details

Defined in Data.Set.Internal

Methods

(<>) :: MergeSet a -> MergeSet a -> MergeSet a #

sconcat :: NonEmpty (MergeSet a) -> MergeSet a #

stimes :: Integral b => b -> MergeSet a -> MergeSet a #

Ord a => Semigroup (Set a)

Since: containers-0.5.7

Instance details

Defined in Data.Set.Internal

Methods

(<>) :: Set a -> Set a -> Set a #

sconcat :: NonEmpty (Set a) -> Set a #

stimes :: Integral b => b -> Set a -> Set a #

Semigroup (DNonEmpty a) 
Instance details

Defined in Data.DList.DNonEmpty.Internal

Methods

(<>) :: DNonEmpty a -> DNonEmpty a -> DNonEmpty a #

sconcat :: NonEmpty (DNonEmpty a) -> DNonEmpty a #

stimes :: Integral b => b -> DNonEmpty a -> DNonEmpty a #

Semigroup (DList a) 
Instance details

Defined in Data.DList.Internal

Methods

(<>) :: DList a -> DList a -> DList a #

sconcat :: NonEmpty (DList a) -> DList a #

stimes :: Integral b => b -> DList a -> DList a #

Semigroup a => Semigroup (IO a)

Since: base-4.10.0.0

Instance details

Defined in GHC.Base

Methods

(<>) :: IO a -> IO a -> IO a #

sconcat :: NonEmpty (IO a) -> IO a #

stimes :: Integral b => b -> IO a -> IO a #

Semigroup a => Semigroup (May a) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

(<>) :: May a -> May a -> May a #

sconcat :: NonEmpty (May a) -> May a #

stimes :: Integral b => b -> May a -> May a #

(Semigroup mono, GrowingAppend mono) => Semigroup (NonNull mono) 
Instance details

Defined in Data.NonNull

Methods

(<>) :: NonNull mono -> NonNull mono -> NonNull mono #

sconcat :: NonEmpty (NonNull mono) -> NonNull mono #

stimes :: Integral b => b -> NonNull mono -> NonNull mono #

Semigroup (InfoMod a) 
Instance details

Defined in Options.Applicative.Builder

Methods

(<>) :: InfoMod a -> InfoMod a -> InfoMod a #

sconcat :: NonEmpty (InfoMod a) -> InfoMod a #

stimes :: Integral b => b -> InfoMod a -> InfoMod a #

Semigroup (DefaultProp a) 
Instance details

Defined in Options.Applicative.Builder.Internal

Semigroup (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

(<>) :: Doc a -> Doc a -> Doc a #

sconcat :: NonEmpty (Doc a) -> Doc a #

stimes :: Integral b => b -> Doc a -> Doc a #

Semigroup (Doc ann)
x <> y = hcat [x, y]
>>> "hello" <> "world" :: Doc ann
helloworld
Instance details

Defined in Prettyprinter.Internal

Methods

(<>) :: Doc ann -> Doc ann -> Doc ann #

sconcat :: NonEmpty (Doc ann) -> Doc ann #

stimes :: Integral b => b -> Doc ann -> Doc ann #

Semigroup (Array a)

Since: primitive-0.6.3.0

Instance details

Defined in Data.Primitive.Array

Methods

(<>) :: Array a -> Array a -> Array a #

sconcat :: NonEmpty (Array a) -> Array a #

stimes :: Integral b => b -> Array a -> Array a #

Semigroup (PrimArray a)

Since: primitive-0.6.4.0

Instance details

Defined in Data.Primitive.PrimArray

Methods

(<>) :: PrimArray a -> PrimArray a -> PrimArray a #

sconcat :: NonEmpty (PrimArray a) -> PrimArray a #

stimes :: Integral b => b -> PrimArray a -> PrimArray a #

Semigroup (SmallArray a)

Since: primitive-0.6.3.0

Instance details

Defined in Data.Primitive.SmallArray

Monad m => Semigroup (RetryPolicyM m) 
Instance details

Defined in Control.Retry

Semigroup (GLogFunc msg)

Perform both sets of actions per log entry.

Since: rio-0.1.13.0

Instance details

Defined in RIO.Prelude.Logger

Methods

(<>) :: GLogFunc msg -> GLogFunc msg -> GLogFunc msg #

sconcat :: NonEmpty (GLogFunc msg) -> GLogFunc msg #

stimes :: Integral b => b -> GLogFunc msg -> GLogFunc msg #

(Generic a, GSemigroup (Rep a)) => Semigroup (GenericSemigroupMonoid a) 
Instance details

Defined in Data.Semigroup.Generic

Semigroup (OneOrListOf a) Source # 
Instance details

Defined in Stackctl.OneOrListOf

Semigroup a => Semigroup (Maybe a) 
Instance details

Defined in Data.Strict.Maybe

Methods

(<>) :: Maybe a -> Maybe a -> Maybe a #

sconcat :: NonEmpty (Maybe a) -> Maybe a #

stimes :: Integral b => b -> Maybe a -> Maybe a #

Semigroup a => Semigroup (Q a)

Since: template-haskell-2.17.0.0

Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(<>) :: Q a -> Q a -> Q a #

sconcat :: NonEmpty (Q a) -> Q a #

stimes :: Integral b => b -> Q a -> Q a #

(Hashable a, Eq a) => Semigroup (HashSet a)

<> = union

\(O(n+m)\)

To obtain good performance, the smaller set must be presented as the first argument.

Examples

Expand
>>> fromList [1,2] <> fromList [2,3]
fromList [1,2,3]
Instance details

Defined in Data.HashSet.Internal

Methods

(<>) :: HashSet a -> HashSet a -> HashSet a #

sconcat :: NonEmpty (HashSet a) -> HashSet a #

stimes :: Integral b => b -> HashSet a -> HashSet a #

Semigroup (Vector a) 
Instance details

Defined in Data.Vector

Methods

(<>) :: Vector a -> Vector a -> Vector a #

sconcat :: NonEmpty (Vector a) -> Vector a #

stimes :: Integral b => b -> Vector a -> Vector a #

Prim a => Semigroup (Vector a) 
Instance details

Defined in Data.Vector.Primitive

Methods

(<>) :: Vector a -> Vector a -> Vector a #

sconcat :: NonEmpty (Vector a) -> Vector a #

stimes :: Integral b => b -> Vector a -> Vector a #

Storable a => Semigroup (Vector a) 
Instance details

Defined in Data.Vector.Storable

Methods

(<>) :: Vector a -> Vector a -> Vector a #

sconcat :: NonEmpty (Vector a) -> Vector a #

stimes :: Integral b => b -> Vector a -> Vector a #

Semigroup (NonEmpty a)

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

(<>) :: NonEmpty a -> NonEmpty a -> NonEmpty a #

sconcat :: NonEmpty (NonEmpty a) -> NonEmpty a #

stimes :: Integral b => b -> NonEmpty a -> NonEmpty a #

Semigroup a => Semigroup (Maybe a)

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

(<>) :: Maybe a -> Maybe a -> Maybe a #

sconcat :: NonEmpty (Maybe a) -> Maybe a #

stimes :: Integral b => b -> Maybe a -> Maybe a #

Semigroup a => Semigroup (a)

Since: base-4.15

Instance details

Defined in GHC.Base

Methods

(<>) :: (a) -> (a) -> (a) #

sconcat :: NonEmpty (a) -> (a) #

stimes :: Integral b => b -> (a) -> (a) #

Semigroup [a]

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

(<>) :: [a] -> [a] -> [a] #

sconcat :: NonEmpty [a] -> [a] #

stimes :: Integral b => b -> [a] -> [a] #

Semigroup (Parser i a) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

(<>) :: Parser i a -> Parser i a -> Parser i a #

sconcat :: NonEmpty (Parser i a) -> Parser i a #

stimes :: Integral b => b -> Parser i a -> Parser i a #

Semigroup (Either a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Either

Methods

(<>) :: Either a b -> Either a b -> Either a b #

sconcat :: NonEmpty (Either a b) -> Either a b #

stimes :: Integral b0 => b0 -> Either a b -> Either a b #

Semigroup a => Semigroup (Op a b)

(<>) @(Op a b) without newtypes is (<>) @(b->a) = liftA2 (<>). This lifts the Semigroup operation (<>) over the output of a.

(<>) :: Op a b -> Op a b -> Op a b
Op f <> Op g = Op a -> f a <> g a
Instance details

Defined in Data.Functor.Contravariant

Methods

(<>) :: Op a b -> Op a b -> Op a b #

sconcat :: NonEmpty (Op a b) -> Op a b #

stimes :: Integral b0 => b0 -> Op a b -> Op a b #

Semigroup (Proxy s)

Since: base-4.9.0.0

Instance details

Defined in Data.Proxy

Methods

(<>) :: Proxy s -> Proxy s -> Proxy s #

sconcat :: NonEmpty (Proxy s) -> Proxy s #

stimes :: Integral b => b -> Proxy s -> Proxy s #

Semigroup (U1 p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

(<>) :: U1 p -> U1 p -> U1 p #

sconcat :: NonEmpty (U1 p) -> U1 p #

stimes :: Integral b => b -> U1 p -> U1 p #

Semigroup (V1 p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

(<>) :: V1 p -> V1 p -> V1 p #

sconcat :: NonEmpty (V1 p) -> V1 p #

stimes :: Integral b => b -> V1 p -> V1 p #

Semigroup a => Semigroup (ST s a)

Since: base-4.11.0.0

Instance details

Defined in GHC.ST

Methods

(<>) :: ST s a -> ST s a -> ST s a #

sconcat :: NonEmpty (ST s a) -> ST s a #

stimes :: Integral b => b -> ST s a -> ST s a #

Ord k => Semigroup (Map k v) 
Instance details

Defined in Data.Map.Internal

Methods

(<>) :: Map k v -> Map k v -> Map k v #

sconcat :: NonEmpty (Map k v) -> Map k v #

stimes :: Integral b => b -> Map k v -> Map k v #

Semigroup (Mod t a) 
Instance details

Defined in Env.Internal.Parser

Methods

(<>) :: Mod t a -> Mod t a -> Mod t a #

sconcat :: NonEmpty (Mod t a) -> Mod t a #

stimes :: Integral b => b -> Mod t a -> Mod t a #

(Semigroup e, Semigroup r) => Semigroup (AllE e r) 
Instance details

Defined in Control.Error.Util

Methods

(<>) :: AllE e r -> AllE e r -> AllE e r #

sconcat :: NonEmpty (AllE e r) -> AllE e r #

stimes :: Integral b => b -> AllE e r -> AllE e r #

(Semigroup e, Semigroup r) => Semigroup (AnyE e r) 
Instance details

Defined in Control.Error.Util

Methods

(<>) :: AnyE e r -> AnyE e r -> AnyE e r #

sconcat :: NonEmpty (AnyE e r) -> AnyE e r #

stimes :: Integral b => b -> AnyE e r -> AnyE e r #

Semigroup (f a) => Semigroup (Indexing f a) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

(<>) :: Indexing f a -> Indexing f a -> Indexing f a #

sconcat :: NonEmpty (Indexing f a) -> Indexing f a #

stimes :: Integral b => b -> Indexing f a -> Indexing f a #

Semigroup (ReifiedFold s a) 
Instance details

Defined in Control.Lens.Reified

Methods

(<>) :: ReifiedFold s a -> ReifiedFold s a -> ReifiedFold s a #

sconcat :: NonEmpty (ReifiedFold s a) -> ReifiedFold s a #

stimes :: Integral b => b -> ReifiedFold s a -> ReifiedFold s a #

Applicative f => Semigroup (Traversed a f) 
Instance details

Defined in Lens.Micro

Methods

(<>) :: Traversed a f -> Traversed a f -> Traversed a f #

sconcat :: NonEmpty (Traversed a f) -> Traversed a f #

stimes :: Integral b => b -> Traversed a f -> Traversed a f #

Semigroup a => Semigroup (Err e a) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

(<>) :: Err e a -> Err e a -> Err e a #

sconcat :: NonEmpty (Err e a) -> Err e a #

stimes :: Integral b => b -> Err e a -> Err e a #

(Applicative m, Semigroup a) => Semigroup (LoggingT m a) 
Instance details

Defined in Control.Monad.Logger

Methods

(<>) :: LoggingT m a -> LoggingT m a -> LoggingT m a #

sconcat :: NonEmpty (LoggingT m a) -> LoggingT m a #

stimes :: Integral b => b -> LoggingT m a -> LoggingT m a #

(Applicative m, Semigroup a) => Semigroup (NoLoggingT m a) 
Instance details

Defined in Control.Monad.Logger

Methods

(<>) :: NoLoggingT m a -> NoLoggingT m a -> NoLoggingT m a #

sconcat :: NonEmpty (NoLoggingT m a) -> NoLoggingT m a #

stimes :: Integral b => b -> NoLoggingT m a -> NoLoggingT m a #

(Applicative m, Semigroup a) => Semigroup (WriterLoggingT m a) 
Instance details

Defined in Control.Monad.Logger

Semigroup (Mod f a)

Since: optparse-applicative-0.13.0.0

Instance details

Defined in Options.Applicative.Builder.Internal

Methods

(<>) :: Mod f a -> Mod f a -> Mod f a #

sconcat :: NonEmpty (Mod f a) -> Mod f a #

stimes :: Integral b => b -> Mod f a -> Mod f a #

Semigroup a => Semigroup (RIO env a) 
Instance details

Defined in RIO.Prelude.RIO

Methods

(<>) :: RIO env a -> RIO env a -> RIO env a #

sconcat :: NonEmpty (RIO env a) -> RIO env a #

stimes :: Integral b => b -> RIO env a -> RIO env a #

Semigroup (Either a b) 
Instance details

Defined in Data.Strict.Either

Methods

(<>) :: Either a b -> Either a b -> Either a b #

sconcat :: NonEmpty (Either a b) -> Either a b #

stimes :: Integral b0 => b0 -> Either a b -> Either a b #

(Semigroup a, Semigroup b) => Semigroup (These a b) 
Instance details

Defined in Data.Strict.These

Methods

(<>) :: These a b -> These a b -> These a b #

sconcat :: NonEmpty (These a b) -> These a b #

stimes :: Integral b0 => b0 -> These a b -> These a b #

(Semigroup a, Semigroup b) => Semigroup (Pair a b) 
Instance details

Defined in Data.Strict.Tuple

Methods

(<>) :: Pair a b -> Pair a b -> Pair a b #

sconcat :: NonEmpty (Pair a b) -> Pair a b #

stimes :: Integral b0 => b0 -> Pair a b -> Pair a b #

(Semigroup a, Semigroup b) => Semigroup (These a b) 
Instance details

Defined in Data.These

Methods

(<>) :: These a b -> These a b -> These a b #

sconcat :: NonEmpty (These a b) -> These a b #

stimes :: Integral b0 => b0 -> These a b -> These a b #

(MonadUnliftIO m, Semigroup a) => Semigroup (Conc m a)

Since: unliftio-0.2.9.0

Instance details

Defined in UnliftIO.Internals.Async

Methods

(<>) :: Conc m a -> Conc m a -> Conc m a #

sconcat :: NonEmpty (Conc m a) -> Conc m a #

stimes :: Integral b => b -> Conc m a -> Conc m a #

(MonadUnliftIO m, Semigroup a) => Semigroup (Concurrently m a)

Only defined by async for base >= 4.9.

Since: unliftio-0.1.0.0

Instance details

Defined in UnliftIO.Internals.Async

Methods

(<>) :: Concurrently m a -> Concurrently m a -> Concurrently m a #

sconcat :: NonEmpty (Concurrently m a) -> Concurrently m a #

stimes :: Integral b => b -> Concurrently m a -> Concurrently m a #

(Eq k, Hashable k) => Semigroup (HashMap k v)

<> = union

If a key occurs in both maps, the mapping from the first will be the mapping in the result.

Examples

Expand
>>> fromList [(1,'a'),(2,'b')] <> fromList [(2,'c'),(3,'d')]
fromList [(1,'a'),(2,'b'),(3,'d')]
Instance details

Defined in Data.HashMap.Internal

Methods

(<>) :: HashMap k v -> HashMap k v -> HashMap k v #

sconcat :: NonEmpty (HashMap k v) -> HashMap k v #

stimes :: Integral b => b -> HashMap k v -> HashMap k v #

Semigroup b => Semigroup (a -> b)

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

(<>) :: (a -> b) -> (a -> b) -> a -> b #

sconcat :: NonEmpty (a -> b) -> a -> b #

stimes :: Integral b0 => b0 -> (a -> b) -> a -> b #

(Semigroup a, Semigroup b) => Semigroup (a, b)

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

(<>) :: (a, b) -> (a, b) -> (a, b) #

sconcat :: NonEmpty (a, b) -> (a, b) #

stimes :: Integral b0 => b0 -> (a, b) -> (a, b) #

Semigroup a => Semigroup (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

(<>) :: Const a b -> Const a b -> Const a b #

sconcat :: NonEmpty (Const a b) -> Const a b #

stimes :: Integral b0 => b0 -> Const a b -> Const a b #

(Applicative f, Semigroup a) => Semigroup (Ap f a)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

(<>) :: Ap f a -> Ap f a -> Ap f a #

sconcat :: NonEmpty (Ap f a) -> Ap f a #

stimes :: Integral b => b -> Ap f a -> Ap f a #

Alternative f => Semigroup (Alt f a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

(<>) :: Alt f a -> Alt f a -> Alt f a #

sconcat :: NonEmpty (Alt f a) -> Alt f a #

stimes :: Integral b => b -> Alt f a -> Alt f a #

Semigroup (f p) => Semigroup (Rec1 f p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

(<>) :: Rec1 f p -> Rec1 f p -> Rec1 f p #

sconcat :: NonEmpty (Rec1 f p) -> Rec1 f p #

stimes :: Integral b => b -> Rec1 f p -> Rec1 f p #

Semigroup (ReifiedIndexedFold i s a) 
Instance details

Defined in Control.Lens.Reified

(Monad m, Semigroup r) => Semigroup (Effect m r a) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

(<>) :: Effect m r a -> Effect m r a -> Effect m r a #

sconcat :: NonEmpty (Effect m r a) -> Effect m r a #

stimes :: Integral b => b -> Effect m r a -> Effect m r a #

Reifies s (ReifiedMonoid a) => Semigroup (ReflectedMonoid a s) 
Instance details

Defined in Data.Reflection

Semigroup a => Semigroup (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

(<>) :: Tagged s a -> Tagged s a -> Tagged s a #

sconcat :: NonEmpty (Tagged s a) -> Tagged s a #

stimes :: Integral b => b -> Tagged s a -> Tagged s a #

Semigroup a => Semigroup (Constant a b) 
Instance details

Defined in Data.Functor.Constant

Methods

(<>) :: Constant a b -> Constant a b -> Constant a b #

sconcat :: NonEmpty (Constant a b) -> Constant a b #

stimes :: Integral b0 => b0 -> Constant a b -> Constant a b #

(Semigroup a, Semigroup b, Semigroup c) => Semigroup (a, b, c)

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

(<>) :: (a, b, c) -> (a, b, c) -> (a, b, c) #

sconcat :: NonEmpty (a, b, c) -> (a, b, c) #

stimes :: Integral b0 => b0 -> (a, b, c) -> (a, b, c) #

(Semigroup (f a), Semigroup (g a)) => Semigroup (Product f g a)

Since: base-4.16.0.0

Instance details

Defined in Data.Functor.Product

Methods

(<>) :: Product f g a -> Product f g a -> Product f g a #

sconcat :: NonEmpty (Product f g a) -> Product f g a #

stimes :: Integral b => b -> Product f g a -> Product f g a #

(Semigroup (f p), Semigroup (g p)) => Semigroup ((f :*: g) p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

(<>) :: (f :*: g) p -> (f :*: g) p -> (f :*: g) p #

sconcat :: NonEmpty ((f :*: g) p) -> (f :*: g) p #

stimes :: Integral b => b -> (f :*: g) p -> (f :*: g) p #

Semigroup c => Semigroup (K1 i c p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

(<>) :: K1 i c p -> K1 i c p -> K1 i c p #

sconcat :: NonEmpty (K1 i c p) -> K1 i c p #

stimes :: Integral b => b -> K1 i c p -> K1 i c p #

Monad m => Semigroup (ConduitT i o m ()) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

(<>) :: ConduitT i o m () -> ConduitT i o m () -> ConduitT i o m () #

sconcat :: NonEmpty (ConduitT i o m ()) -> ConduitT i o m () #

stimes :: Integral b => b -> ConduitT i o m () -> ConduitT i o m () #

(Semigroup a, Semigroup b, Semigroup c, Semigroup d) => Semigroup (a, b, c, d)

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

(<>) :: (a, b, c, d) -> (a, b, c, d) -> (a, b, c, d) #

sconcat :: NonEmpty (a, b, c, d) -> (a, b, c, d) #

stimes :: Integral b0 => b0 -> (a, b, c, d) -> (a, b, c, d) #

Semigroup (f (g a)) => Semigroup (Compose f g a)

Since: base-4.16.0.0

Instance details

Defined in Data.Functor.Compose

Methods

(<>) :: Compose f g a -> Compose f g a -> Compose f g a #

sconcat :: NonEmpty (Compose f g a) -> Compose f g a #

stimes :: Integral b => b -> Compose f g a -> Compose f g a #

Semigroup (f (g p)) => Semigroup ((f :.: g) p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

(<>) :: (f :.: g) p -> (f :.: g) p -> (f :.: g) p #

sconcat :: NonEmpty ((f :.: g) p) -> (f :.: g) p #

stimes :: Integral b => b -> (f :.: g) p -> (f :.: g) p #

Semigroup (f p) => Semigroup (M1 i c f p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

(<>) :: M1 i c f p -> M1 i c f p -> M1 i c f p #

sconcat :: NonEmpty (M1 i c f p) -> M1 i c f p #

stimes :: Integral b => b -> M1 i c f p -> M1 i c f p #

(Semigroup a, Semigroup b, Semigroup c, Semigroup d, Semigroup e) => Semigroup (a, b, c, d, e)

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

(<>) :: (a, b, c, d, e) -> (a, b, c, d, e) -> (a, b, c, d, e) #

sconcat :: NonEmpty (a, b, c, d, e) -> (a, b, c, d, e) #

stimes :: Integral b0 => b0 -> (a, b, c, d, e) -> (a, b, c, d, e) #

Monad m => Semigroup (Pipe l i o u m ()) 
Instance details

Defined in Data.Conduit.Internal.Pipe

Methods

(<>) :: Pipe l i o u m () -> Pipe l i o u m () -> Pipe l i o u m () #

sconcat :: NonEmpty (Pipe l i o u m ()) -> Pipe l i o u m () #

stimes :: Integral b => b -> Pipe l i o u m () -> Pipe l i o u m () #

class Semigroup a => Monoid a where #

The class of monoids (types with an associative binary operation that has an identity). Instances should satisfy the following:

Right identity
x <> mempty = x
Left identity
mempty <> x = x
Associativity
x <> (y <> z) = (x <> y) <> z (Semigroup law)
Concatenation
mconcat = foldr (<>) mempty

The method names refer to the monoid of lists under concatenation, but there are many other instances.

Some types can be viewed as a monoid in more than one way, e.g. both addition and multiplication on numbers. In such cases we often define newtypes and make those instances of Monoid, e.g. Sum and Product.

NOTE: Semigroup is a superclass of Monoid since base-4.11.0.0.

Minimal complete definition

mempty

Methods

mempty :: a #

Identity of mappend

>>> "Hello world" <> mempty
"Hello world"

mappend :: a -> a -> a #

An associative operation

NOTE: This method is redundant and has the default implementation mappend = (<>) since base-4.11.0.0. Should it be implemented manually, since mappend is a synonym for (<>), it is expected that the two functions are defined the same way. In a future GHC release mappend will be removed from Monoid.

mconcat :: [a] -> a #

Fold a list using the monoid.

For most types, the default definition for mconcat will be used, but the function is included in the class definition so that an optimized version can be provided for specific types.

>>> mconcat ["Hello", " ", "Haskell", "!"]
"Hello Haskell!"

Instances

Instances details
Monoid Pattern 
Instance details

Defined in System.FilePath.Glob.Base

Monoid Series 
Instance details

Defined in Data.Aeson.Encoding.Internal

Monoid Key 
Instance details

Defined in Data.Aeson.Key

Methods

mempty :: Key #

mappend :: Key -> Key -> Key #

mconcat :: [Key] -> Key #

Monoid RawPath 
Instance details

Defined in Amazonka.Data.Path

Monoid QueryString 
Instance details

Defined in Amazonka.Data.Query

Monoid More 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

mempty :: More #

mappend :: More -> More -> More #

mconcat :: [More] -> More #

Monoid All

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

mempty :: All #

mappend :: All -> All -> All #

mconcat :: [All] -> All #

Monoid Any

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

mempty :: Any #

mappend :: Any -> Any -> Any #

mconcat :: [Any] -> Any #

Monoid String 
Instance details

Defined in Basement.UTF8.Base

Monoid Builder 
Instance details

Defined in Data.ByteString.Builder.Internal

Monoid ByteString 
Instance details

Defined in Data.ByteString.Internal

Monoid ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Monoid ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Monoid IntSet 
Instance details

Defined in Data.IntSet.Internal

Monoid ByteArray 
Instance details

Defined in Data.Array.Byte

Monoid LogStr 
Instance details

Defined in System.Log.FastLogger.LogStr

Monoid Ordering

Since: base-2.1

Instance details

Defined in GHC.Base

Monoid CookieJar

Since 1.9

Instance details

Defined in Network.HTTP.Client.Types

Monoid RequestBody 
Instance details

Defined in Network.HTTP.Client.Types

Monoid PrefsMod 
Instance details

Defined in Options.Applicative.Builder

Monoid ParserHelp 
Instance details

Defined in Options.Applicative.Help.Types

Monoid Completer 
Instance details

Defined in Options.Applicative.Types

Monoid ParseError 
Instance details

Defined in Options.Applicative.Types

Monoid Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Methods

mempty :: Doc #

mappend :: Doc -> Doc -> Doc #

mconcat :: [Doc] -> Doc #

Monoid Utf8Builder 
Instance details

Defined in RIO.Prelude.Display

Monoid LogFunc

mempty peforms no logging.

Since: rio-0.0.0.0

Instance details

Defined in RIO.Prelude.Logger

Monoid Verbosity Source # 
Instance details

Defined in Stackctl.VerboseOption

Monoid ShortText 
Instance details

Defined in Data.Text.Short.Internal

Monoid ()

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

mempty :: () #

mappend :: () -> () -> () #

mconcat :: [()] -> () #

Monoid (KeyMap v) 
Instance details

Defined in Data.Aeson.KeyMap

Methods

mempty :: KeyMap v #

mappend :: KeyMap v -> KeyMap v -> KeyMap v #

mconcat :: [KeyMap v] -> KeyMap v #

Monoid (IResult a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

mempty :: IResult a #

mappend :: IResult a -> IResult a -> IResult a #

mconcat :: [IResult a] -> IResult a #

Monoid (Parser a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

mempty :: Parser a #

mappend :: Parser a -> Parser a -> Parser a #

mconcat :: [Parser a] -> Parser a #

Monoid (Result a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

mempty :: Result a #

mappend :: Result a -> Result a -> Result a #

mconcat :: [Result a] -> Result a #

Monoid a => Monoid (Sensitive a) 
Instance details

Defined in Amazonka.Data.Sensitive

(Semigroup a, Monoid a) => Monoid (Concurrently a)

Since: async-2.1.0

Instance details

Defined in Control.Concurrent.Async

Monoid (Comparison a)

mempty on comparisons always returns EQ. Without newtypes this equals pure (pure EQ).

mempty :: Comparison a
mempty = Comparison _ _ -> EQ
Instance details

Defined in Data.Functor.Contravariant

Monoid (Equivalence a)

mempty on equivalences always returns True. Without newtypes this equals pure (pure True).

mempty :: Equivalence a
mempty = Equivalence _ _ -> True
Instance details

Defined in Data.Functor.Contravariant

Monoid (Predicate a)

mempty on predicates always returns True. Without newtypes this equals pure True.

mempty :: Predicate a
mempty = _ -> True
Instance details

Defined in Data.Functor.Contravariant

Monoid a => Monoid (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

mempty :: Identity a #

mappend :: Identity a -> Identity a -> Identity a #

mconcat :: [Identity a] -> Identity a #

Ord a => Monoid (Max a)

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Utils

Methods

mempty :: Max a #

mappend :: Max a -> Max a -> Max a #

mconcat :: [Max a] -> Max a #

Ord a => Monoid (Min a)

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Utils

Methods

mempty :: Min a #

mappend :: Min a -> Min a -> Min a #

mconcat :: [Min a] -> Min a #

Monoid (First a)

Since: base-2.1

Instance details

Defined in Data.Monoid

Methods

mempty :: First a #

mappend :: First a -> First a -> First a #

mconcat :: [First a] -> First a #

Monoid (Last a)

Since: base-2.1

Instance details

Defined in Data.Monoid

Methods

mempty :: Last a #

mappend :: Last a -> Last a -> Last a #

mconcat :: [Last a] -> Last a #

Monoid a => Monoid (Down a)

Since: base-4.11.0.0

Instance details

Defined in Data.Ord

Methods

mempty :: Down a #

mappend :: Down a -> Down a -> Down a #

mconcat :: [Down a] -> Down a #

(Ord a, Bounded a) => Monoid (Max a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

mempty :: Max a #

mappend :: Max a -> Max a -> Max a #

mconcat :: [Max a] -> Max a #

(Ord a, Bounded a) => Monoid (Min a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

mempty :: Min a #

mappend :: Min a -> Min a -> Min a #

mconcat :: [Min a] -> Min a #

Monoid m => Monoid (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Monoid a => Monoid (Dual a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

mempty :: Dual a #

mappend :: Dual a -> Dual a -> Dual a #

mconcat :: [Dual a] -> Dual a #

Monoid (Endo a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

mempty :: Endo a #

mappend :: Endo a -> Endo a -> Endo a #

mconcat :: [Endo a] -> Endo a #

Num a => Monoid (Product a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

mempty :: Product a #

mappend :: Product a -> Product a -> Product a #

mconcat :: [Product a] -> Product a #

Num a => Monoid (Sum a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

mempty :: Sum a #

mappend :: Sum a -> Sum a -> Sum a #

mconcat :: [Sum a] -> Sum a #

Monoid p => Monoid (Par1 p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

mempty :: Par1 p #

mappend :: Par1 p -> Par1 p -> Par1 p #

mconcat :: [Par1 p] -> Par1 p #

PrimType ty => Monoid (Block ty) 
Instance details

Defined in Basement.Block.Base

Methods

mempty :: Block ty #

mappend :: Block ty -> Block ty -> Block ty #

mconcat :: [Block ty] -> Block ty #

Monoid (CountOf ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

mempty :: CountOf ty #

mappend :: CountOf ty -> CountOf ty -> CountOf ty #

mconcat :: [CountOf ty] -> CountOf ty #

PrimType ty => Monoid (UArray ty) 
Instance details

Defined in Basement.UArray.Base

Methods

mempty :: UArray ty #

mappend :: UArray ty -> UArray ty -> UArray ty #

mconcat :: [UArray ty] -> UArray ty #

Monoid (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

mempty :: IntMap a #

mappend :: IntMap a -> IntMap a -> IntMap a #

mconcat :: [IntMap a] -> IntMap a #

Monoid (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

mempty :: Seq a #

mappend :: Seq a -> Seq a -> Seq a #

mconcat :: [Seq a] -> Seq a #

Monoid (MergeSet a) 
Instance details

Defined in Data.Set.Internal

Methods

mempty :: MergeSet a #

mappend :: MergeSet a -> MergeSet a -> MergeSet a #

mconcat :: [MergeSet a] -> MergeSet a #

Ord a => Monoid (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

mempty :: Set a #

mappend :: Set a -> Set a -> Set a #

mconcat :: [Set a] -> Set a #

Monoid (DList a) 
Instance details

Defined in Data.DList.Internal

Methods

mempty :: DList a #

mappend :: DList a -> DList a -> DList a #

mconcat :: [DList a] -> DList a #

Monoid a => Monoid (IO a)

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

mempty :: IO a #

mappend :: IO a -> IO a -> IO a #

mconcat :: [IO a] -> IO a #

Monoid a => Monoid (May a) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

mempty :: May a #

mappend :: May a -> May a -> May a #

mconcat :: [May a] -> May a #

Monoid (InfoMod a) 
Instance details

Defined in Options.Applicative.Builder

Methods

mempty :: InfoMod a #

mappend :: InfoMod a -> InfoMod a -> InfoMod a #

mconcat :: [InfoMod a] -> InfoMod a #

Monoid (DefaultProp a) 
Instance details

Defined in Options.Applicative.Builder.Internal

Monoid (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

mempty :: Doc a #

mappend :: Doc a -> Doc a -> Doc a #

mconcat :: [Doc a] -> Doc a #

Monoid (Doc ann)
mempty = emptyDoc
mconcat = hcat
>>> mappend "hello" "world" :: Doc ann
helloworld
Instance details

Defined in Prettyprinter.Internal

Methods

mempty :: Doc ann #

mappend :: Doc ann -> Doc ann -> Doc ann #

mconcat :: [Doc ann] -> Doc ann #

Monoid (Array a) 
Instance details

Defined in Data.Primitive.Array

Methods

mempty :: Array a #

mappend :: Array a -> Array a -> Array a #

mconcat :: [Array a] -> Array a #

Monoid (PrimArray a)

Since: primitive-0.6.4.0

Instance details

Defined in Data.Primitive.PrimArray

Monoid (SmallArray a) 
Instance details

Defined in Data.Primitive.SmallArray

Monad m => Monoid (RetryPolicyM m) 
Instance details

Defined in Control.Retry

Monoid (GLogFunc msg)

mempty peforms no logging.

Since: rio-0.1.13.0

Instance details

Defined in RIO.Prelude.Logger

Methods

mempty :: GLogFunc msg #

mappend :: GLogFunc msg -> GLogFunc msg -> GLogFunc msg #

mconcat :: [GLogFunc msg] -> GLogFunc msg #

(Generic a, GMonoid (Rep a)) => Monoid (GenericSemigroupMonoid a) 
Instance details

Defined in Data.Semigroup.Generic

Semigroup a => Monoid (Maybe a) 
Instance details

Defined in Data.Strict.Maybe

Methods

mempty :: Maybe a #

mappend :: Maybe a -> Maybe a -> Maybe a #

mconcat :: [Maybe a] -> Maybe a #

Monoid a => Monoid (Q a)

Since: template-haskell-2.17.0.0

Instance details

Defined in Language.Haskell.TH.Syntax

Methods

mempty :: Q a #

mappend :: Q a -> Q a -> Q a #

mconcat :: [Q a] -> Q a #

(Hashable a, Eq a) => Monoid (HashSet a)

mempty = empty

mappend = union

\(O(n+m)\)

To obtain good performance, the smaller set must be presented as the first argument.

Examples

Expand
>>> mappend (fromList [1,2]) (fromList [2,3])
fromList [1,2,3]
Instance details

Defined in Data.HashSet.Internal

Methods

mempty :: HashSet a #

mappend :: HashSet a -> HashSet a -> HashSet a #

mconcat :: [HashSet a] -> HashSet a #

Monoid (Vector a) 
Instance details

Defined in Data.Vector

Methods

mempty :: Vector a #

mappend :: Vector a -> Vector a -> Vector a #

mconcat :: [Vector a] -> Vector a #

Prim a => Monoid (Vector a) 
Instance details

Defined in Data.Vector.Primitive

Methods

mempty :: Vector a #

mappend :: Vector a -> Vector a -> Vector a #

mconcat :: [Vector a] -> Vector a #

Storable a => Monoid (Vector a) 
Instance details

Defined in Data.Vector.Storable

Methods

mempty :: Vector a #

mappend :: Vector a -> Vector a -> Vector a #

mconcat :: [Vector a] -> Vector a #

Semigroup a => Monoid (Maybe a)

Lift a semigroup into Maybe forming a Monoid according to http://en.wikipedia.org/wiki/Monoid: "Any semigroup S may be turned into a monoid simply by adjoining an element e not in S and defining e*e = e and e*s = s = s*e for all s ∈ S."

Since 4.11.0: constraint on inner a value generalised from Monoid to Semigroup.

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

mempty :: Maybe a #

mappend :: Maybe a -> Maybe a -> Maybe a #

mconcat :: [Maybe a] -> Maybe a #

Monoid a => Monoid (a)

Since: base-4.15

Instance details

Defined in GHC.Base

Methods

mempty :: (a) #

mappend :: (a) -> (a) -> (a) #

mconcat :: [(a)] -> (a) #

Monoid [a]

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

mempty :: [a] #

mappend :: [a] -> [a] -> [a] #

mconcat :: [[a]] -> [a] #

Monoid (Parser i a) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

mempty :: Parser i a #

mappend :: Parser i a -> Parser i a -> Parser i a #

mconcat :: [Parser i a] -> Parser i a #

Monoid a => Monoid (Op a b)

mempty @(Op a b) without newtypes is mempty @(b->a) = _ -> mempty.

mempty :: Op a b
mempty = Op _ -> mempty
Instance details

Defined in Data.Functor.Contravariant

Methods

mempty :: Op a b #

mappend :: Op a b -> Op a b -> Op a b #

mconcat :: [Op a b] -> Op a b #

Monoid (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

mempty :: Proxy s #

mappend :: Proxy s -> Proxy s -> Proxy s #

mconcat :: [Proxy s] -> Proxy s #

Monoid (U1 p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

mempty :: U1 p #

mappend :: U1 p -> U1 p -> U1 p #

mconcat :: [U1 p] -> U1 p #

Monoid a => Monoid (ST s a)

Since: base-4.11.0.0

Instance details

Defined in GHC.ST

Methods

mempty :: ST s a #

mappend :: ST s a -> ST s a -> ST s a #

mconcat :: [ST s a] -> ST s a #

Ord k => Monoid (Map k v) 
Instance details

Defined in Data.Map.Internal

Methods

mempty :: Map k v #

mappend :: Map k v -> Map k v -> Map k v #

mconcat :: [Map k v] -> Map k v #

Monoid (Mod t a) 
Instance details

Defined in Env.Internal.Parser

Methods

mempty :: Mod t a #

mappend :: Mod t a -> Mod t a -> Mod t a #

mconcat :: [Mod t a] -> Mod t a #

(Monoid e, Monoid r) => Monoid (AllE e r) 
Instance details

Defined in Control.Error.Util

Methods

mempty :: AllE e r #

mappend :: AllE e r -> AllE e r -> AllE e r #

mconcat :: [AllE e r] -> AllE e r #

(Monoid e, Monoid r) => Monoid (AnyE e r) 
Instance details

Defined in Control.Error.Util

Methods

mempty :: AnyE e r #

mappend :: AnyE e r -> AnyE e r -> AnyE e r #

mconcat :: [AnyE e r] -> AnyE e r #

Monoid (f a) => Monoid (Indexing f a)
>>> "cat" ^@.. (folded <> folded)
[(0,'c'),(1,'a'),(2,'t'),(0,'c'),(1,'a'),(2,'t')]
>>> "cat" ^@.. indexing (folded <> folded)
[(0,'c'),(1,'a'),(2,'t'),(3,'c'),(4,'a'),(5,'t')]
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

mempty :: Indexing f a #

mappend :: Indexing f a -> Indexing f a -> Indexing f a #

mconcat :: [Indexing f a] -> Indexing f a #

Monoid (ReifiedFold s a) 
Instance details

Defined in Control.Lens.Reified

Methods

mempty :: ReifiedFold s a #

mappend :: ReifiedFold s a -> ReifiedFold s a -> ReifiedFold s a #

mconcat :: [ReifiedFold s a] -> ReifiedFold s a #

Applicative f => Monoid (Traversed a f) 
Instance details

Defined in Lens.Micro

Methods

mempty :: Traversed a f #

mappend :: Traversed a f -> Traversed a f -> Traversed a f #

mconcat :: [Traversed a f] -> Traversed a f #

Monoid a => Monoid (Err e a) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

mempty :: Err e a #

mappend :: Err e a -> Err e a -> Err e a #

mconcat :: [Err e a] -> Err e a #

(Applicative m, Monoid a) => Monoid (LoggingT m a) 
Instance details

Defined in Control.Monad.Logger

Methods

mempty :: LoggingT m a #

mappend :: LoggingT m a -> LoggingT m a -> LoggingT m a #

mconcat :: [LoggingT m a] -> LoggingT m a #

(Applicative m, Monoid a) => Monoid (NoLoggingT m a) 
Instance details

Defined in Control.Monad.Logger

Methods

mempty :: NoLoggingT m a #

mappend :: NoLoggingT m a -> NoLoggingT m a -> NoLoggingT m a #

mconcat :: [NoLoggingT m a] -> NoLoggingT m a #

(Applicative m, Monoid a) => Monoid (WriterLoggingT m a) 
Instance details

Defined in Control.Monad.Logger

Monoid (Mod f a) 
Instance details

Defined in Options.Applicative.Builder.Internal

Methods

mempty :: Mod f a #

mappend :: Mod f a -> Mod f a -> Mod f a #

mconcat :: [Mod f a] -> Mod f a #

Monoid a => Monoid (RIO env a) 
Instance details

Defined in RIO.Prelude.RIO

Methods

mempty :: RIO env a #

mappend :: RIO env a -> RIO env a -> RIO env a #

mconcat :: [RIO env a] -> RIO env a #

(Monoid a, Monoid b) => Monoid (Pair a b) 
Instance details

Defined in Data.Strict.Tuple

Methods

mempty :: Pair a b #

mappend :: Pair a b -> Pair a b -> Pair a b #

mconcat :: [Pair a b] -> Pair a b #

(Monoid a, MonadUnliftIO m) => Monoid (Conc m a)

Since: unliftio-0.2.9.0

Instance details

Defined in UnliftIO.Internals.Async

Methods

mempty :: Conc m a #

mappend :: Conc m a -> Conc m a -> Conc m a #

mconcat :: [Conc m a] -> Conc m a #

(Semigroup a, Monoid a, MonadUnliftIO m) => Monoid (Concurrently m a)

Since: unliftio-0.1.0.0

Instance details

Defined in UnliftIO.Internals.Async

(Eq k, Hashable k) => Monoid (HashMap k v)

mempty = empty

mappend = union

If a key occurs in both maps, the mapping from the first will be the mapping in the result.

Examples

Expand
>>> mappend (fromList [(1,'a'),(2,'b')]) (fromList [(2,'c'),(3,'d')])
fromList [(1,'a'),(2,'b'),(3,'d')]
Instance details

Defined in Data.HashMap.Internal

Methods

mempty :: HashMap k v #

mappend :: HashMap k v -> HashMap k v -> HashMap k v #

mconcat :: [HashMap k v] -> HashMap k v #

Monoid b => Monoid (a -> b)

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

mempty :: a -> b #

mappend :: (a -> b) -> (a -> b) -> a -> b #

mconcat :: [a -> b] -> a -> b #

(Monoid a, Monoid b) => Monoid (a, b)

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

mempty :: (a, b) #

mappend :: (a, b) -> (a, b) -> (a, b) #

mconcat :: [(a, b)] -> (a, b) #

Monoid a => Monoid (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

mempty :: Const a b #

mappend :: Const a b -> Const a b -> Const a b #

mconcat :: [Const a b] -> Const a b #

(Applicative f, Monoid a) => Monoid (Ap f a)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

mempty :: Ap f a #

mappend :: Ap f a -> Ap f a -> Ap f a #

mconcat :: [Ap f a] -> Ap f a #

Alternative f => Monoid (Alt f a)

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

mempty :: Alt f a #

mappend :: Alt f a -> Alt f a -> Alt f a #

mconcat :: [Alt f a] -> Alt f a #

Monoid (f p) => Monoid (Rec1 f p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

mempty :: Rec1 f p #

mappend :: Rec1 f p -> Rec1 f p -> Rec1 f p #

mconcat :: [Rec1 f p] -> Rec1 f p #

Monoid (ReifiedIndexedFold i s a) 
Instance details

Defined in Control.Lens.Reified

(Monad m, Monoid r) => Monoid (Effect m r a) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

mempty :: Effect m r a #

mappend :: Effect m r a -> Effect m r a -> Effect m r a #

mconcat :: [Effect m r a] -> Effect m r a #

Reifies s (ReifiedMonoid a) => Monoid (ReflectedMonoid a s) 
Instance details

Defined in Data.Reflection

(Semigroup a, Monoid a) => Monoid (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

mempty :: Tagged s a #

mappend :: Tagged s a -> Tagged s a -> Tagged s a #

mconcat :: [Tagged s a] -> Tagged s a #

Monoid a => Monoid (Constant a b) 
Instance details

Defined in Data.Functor.Constant

Methods

mempty :: Constant a b #

mappend :: Constant a b -> Constant a b -> Constant a b #

mconcat :: [Constant a b] -> Constant a b #

(Monoid a, Monoid b, Monoid c) => Monoid (a, b, c)

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

mempty :: (a, b, c) #

mappend :: (a, b, c) -> (a, b, c) -> (a, b, c) #

mconcat :: [(a, b, c)] -> (a, b, c) #

(Monoid (f a), Monoid (g a)) => Monoid (Product f g a)

Since: base-4.16.0.0

Instance details

Defined in Data.Functor.Product

Methods

mempty :: Product f g a #

mappend :: Product f g a -> Product f g a -> Product f g a #

mconcat :: [Product f g a] -> Product f g a #

(Monoid (f p), Monoid (g p)) => Monoid ((f :*: g) p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

mempty :: (f :*: g) p #

mappend :: (f :*: g) p -> (f :*: g) p -> (f :*: g) p #

mconcat :: [(f :*: g) p] -> (f :*: g) p #

Monoid c => Monoid (K1 i c p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

mempty :: K1 i c p #

mappend :: K1 i c p -> K1 i c p -> K1 i c p #

mconcat :: [K1 i c p] -> K1 i c p #

Monad m => Monoid (ConduitT i o m ()) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

mempty :: ConduitT i o m () #

mappend :: ConduitT i o m () -> ConduitT i o m () -> ConduitT i o m () #

mconcat :: [ConduitT i o m ()] -> ConduitT i o m () #

(Monoid a, Monoid b, Monoid c, Monoid d) => Monoid (a, b, c, d)

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

mempty :: (a, b, c, d) #

mappend :: (a, b, c, d) -> (a, b, c, d) -> (a, b, c, d) #

mconcat :: [(a, b, c, d)] -> (a, b, c, d) #

Monoid (f (g a)) => Monoid (Compose f g a)

Since: base-4.16.0.0

Instance details

Defined in Data.Functor.Compose

Methods

mempty :: Compose f g a #

mappend :: Compose f g a -> Compose f g a -> Compose f g a #

mconcat :: [Compose f g a] -> Compose f g a #

Monoid (f (g p)) => Monoid ((f :.: g) p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

mempty :: (f :.: g) p #

mappend :: (f :.: g) p -> (f :.: g) p -> (f :.: g) p #

mconcat :: [(f :.: g) p] -> (f :.: g) p #

Monoid (f p) => Monoid (M1 i c f p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

mempty :: M1 i c f p #

mappend :: M1 i c f p -> M1 i c f p -> M1 i c f p #

mconcat :: [M1 i c f p] -> M1 i c f p #

(Monoid a, Monoid b, Monoid c, Monoid d, Monoid e) => Monoid (a, b, c, d, e)

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

mempty :: (a, b, c, d, e) #

mappend :: (a, b, c, d, e) -> (a, b, c, d, e) -> (a, b, c, d, e) #

mconcat :: [(a, b, c, d, e)] -> (a, b, c, d, e) #

Monad m => Monoid (Pipe l i o u m ()) 
Instance details

Defined in Data.Conduit.Internal.Pipe

Methods

mempty :: Pipe l i o u m () #

mappend :: Pipe l i o u m () -> Pipe l i o u m () -> Pipe l i o u m () #

mconcat :: [Pipe l i o u m ()] -> Pipe l i o u m () #

data Bool #

Constructors

False 
True 

Instances

Instances details
Arbitrary Bool 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen Bool #

shrink :: Bool -> [Bool] #

CoArbitrary Bool 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Bool -> Gen b -> Gen b #

Function Bool 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Bool -> b) -> Bool :-> b #

Testable Bool 
Instance details

Defined in Test.QuickCheck.Property

Methods

property :: Bool -> Property #

propertyForAllShrinkShow :: Gen a -> (a -> [a]) -> (a -> [String]) -> (a -> Bool) -> Property #

FromJSON Bool 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Bool 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Bool 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Bool 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToLog Bool 
Instance details

Defined in Amazonka.Data.Log

ToQuery Bool 
Instance details

Defined in Amazonka.Data.Query

Methods

toQuery :: Bool -> QueryString #

FromText Bool 
Instance details

Defined in Amazonka.Data.Text

ToText Bool 
Instance details

Defined in Amazonka.Data.Text

Methods

toText :: Bool -> Text #

AWSTruncated Bool 
Instance details

Defined in Amazonka.Pager

Methods

truncated :: Bool -> Bool #

Data Bool

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Bool -> c Bool #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Bool #

toConstr :: Bool -> Constr #

dataTypeOf :: Bool -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Bool) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Bool) #

gmapT :: (forall b. Data b => b -> b) -> Bool -> Bool #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Bool -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Bool -> r #

gmapQ :: (forall d. Data d => d -> u) -> Bool -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Bool -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Bool -> m Bool #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Bool -> m Bool #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Bool -> m Bool #

Storable Bool

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Bool -> Int #

alignment :: Bool -> Int #

peekElemOff :: Ptr Bool -> Int -> IO Bool #

pokeElemOff :: Ptr Bool -> Int -> Bool -> IO () #

peekByteOff :: Ptr b -> Int -> IO Bool #

pokeByteOff :: Ptr b -> Int -> Bool -> IO () #

peek :: Ptr Bool -> IO Bool #

poke :: Ptr Bool -> Bool -> IO () #

Bounded Bool

Since: base-2.1

Instance details

Defined in GHC.Enum

Enum Bool

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

succ :: Bool -> Bool #

pred :: Bool -> Bool #

toEnum :: Int -> Bool #

fromEnum :: Bool -> Int #

enumFrom :: Bool -> [Bool] #

enumFromThen :: Bool -> Bool -> [Bool] #

enumFromTo :: Bool -> Bool -> [Bool] #

enumFromThenTo :: Bool -> Bool -> Bool -> [Bool] #

Generic Bool 
Instance details

Defined in GHC.Generics

Associated Types

type Rep Bool :: Type -> Type #

Methods

from :: Bool -> Rep Bool x #

to :: Rep Bool x -> Bool #

SingKind Bool

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Associated Types

type DemoteRep Bool

Methods

fromSing :: forall (a :: Bool). Sing a -> DemoteRep Bool

Read Bool

Since: base-2.1

Instance details

Defined in GHC.Read

Show Bool

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Bool -> ShowS #

show :: Bool -> String #

showList :: [Bool] -> ShowS #

BitOps Bool 
Instance details

Defined in Basement.Bits

FiniteBitsOps Bool 
Instance details

Defined in Basement.Bits

NFData Bool 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Bool -> () #

Eq Bool 
Instance details

Defined in GHC.Classes

Methods

(==) :: Bool -> Bool -> Bool #

(/=) :: Bool -> Bool -> Bool #

Ord Bool 
Instance details

Defined in GHC.Classes

Methods

compare :: Bool -> Bool -> Ordering #

(<) :: Bool -> Bool -> Bool #

(<=) :: Bool -> Bool -> Bool #

(>) :: Bool -> Bool -> Bool #

(>=) :: Bool -> Bool -> Bool #

max :: Bool -> Bool -> Bool #

min :: Bool -> Bool -> Bool #

Hashable Bool 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Bool -> Int #

hash :: Bool -> Int #

Pretty Bool
>>> pretty True
True
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Bool -> Doc ann #

prettyList :: [Bool] -> Doc ann #

Uniform Bool 
Instance details

Defined in System.Random.Internal

Methods

uniformM :: StatefulGen g m => g -> m Bool #

UniformRange Bool 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Bool, Bool) -> g -> m Bool #

Unbox Bool 
Instance details

Defined in Data.Vector.Unboxed.Base

SingI 'False

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

sing :: Sing 'False

SingI 'True

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

sing :: Sing 'True

Lift Bool 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Bool -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Bool -> Code m Bool #

Vector Vector Bool 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Bool 
Instance details

Defined in Data.Vector.Unboxed.Base

AWSTruncated (Maybe Bool) 
Instance details

Defined in Amazonka.Pager

Methods

truncated :: Maybe Bool -> Bool #

type DemoteRep Bool 
Instance details

Defined in GHC.Generics

type DemoteRep Bool = Bool
type Rep Bool

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

type Rep Bool = D1 ('MetaData "Bool" "GHC.Types" "ghc-prim" 'False) (C1 ('MetaCons "False" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "True" 'PrefixI 'False) (U1 :: Type -> Type))
data Sing (a :: Bool) 
Instance details

Defined in GHC.Generics

data Sing (a :: Bool) where
newtype Vector Bool 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Bool 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Bool = MV_Bool (MVector s Word8)

type String = [Char] #

A String is a list of characters. String constants in Haskell are values of type String.

See Data.List for operations on lists.

data Char #

The character type Char is an enumeration whose values represent Unicode (or equivalently ISO/IEC 10646) code points (i.e. characters, see http://www.unicode.org/ for details). This set extends the ISO 8859-1 (Latin-1) character set (the first 256 characters), which is itself an extension of the ASCII character set (the first 128 characters). A character literal in Haskell has type Char.

To convert a Char to or from the corresponding Int value defined by Unicode, use toEnum and fromEnum from the Enum class respectively (or equivalently ord and chr).

Instances

Instances details
Arbitrary Char 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen Char #

shrink :: Char -> [Char] #

CoArbitrary Char 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Char -> Gen b -> Gen b #

Function Char 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Char -> b) -> Char :-> b #

FromJSON Char 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Char 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Char 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Char 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToBody String 
Instance details

Defined in Amazonka.Data.Body

Methods

toBody :: String -> RequestBody #

ToHashedBody String 
Instance details

Defined in Amazonka.Data.Body

ToLog Char 
Instance details

Defined in Amazonka.Data.Log

ToQuery Char 
Instance details

Defined in Amazonka.Data.Query

Methods

toQuery :: Char -> QueryString #

FromText String 
Instance details

Defined in Amazonka.Data.Text

FromText Char 
Instance details

Defined in Amazonka.Data.Text

ToText String 
Instance details

Defined in Amazonka.Data.Text

Methods

toText :: String -> Text #

ToText Char 
Instance details

Defined in Amazonka.Data.Text

Methods

toText :: Char -> Text #

Data Char

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Char -> c Char #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Char #

toConstr :: Char -> Constr #

dataTypeOf :: Char -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Char) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Char) #

gmapT :: (forall b. Data b => b -> b) -> Char -> Char #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Char -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Char -> r #

gmapQ :: (forall d. Data d => d -> u) -> Char -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Char -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Char -> m Char #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Char -> m Char #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Char -> m Char #

Storable Char

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Char -> Int #

alignment :: Char -> Int #

peekElemOff :: Ptr Char -> Int -> IO Char #

pokeElemOff :: Ptr Char -> Int -> Char -> IO () #

peekByteOff :: Ptr b -> Int -> IO Char #

pokeByteOff :: Ptr b -> Int -> Char -> IO () #

peek :: Ptr Char -> IO Char #

poke :: Ptr Char -> Char -> IO () #

Bounded Char

Since: base-2.1

Instance details

Defined in GHC.Enum

Enum Char

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

succ :: Char -> Char #

pred :: Char -> Char #

toEnum :: Int -> Char #

fromEnum :: Char -> Int #

enumFrom :: Char -> [Char] #

enumFromThen :: Char -> Char -> [Char] #

enumFromTo :: Char -> Char -> [Char] #

enumFromThenTo :: Char -> Char -> Char -> [Char] #

Read Char

Since: base-2.1

Instance details

Defined in GHC.Read

Show Char

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Char -> ShowS #

show :: Char -> String #

showList :: [Char] -> ShowS #

Subtractive Char 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Char #

Methods

(-) :: Char -> Char -> Difference Char #

PrimMemoryComparable Char 
Instance details

Defined in Basement.PrimType

PrimType Char 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Char :: Nat #

NFData Char 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Char -> () #

ToLogStr String 
Instance details

Defined in System.Log.FastLogger.LogStr

Methods

toLogStr :: String -> LogStr #

Eq Char 
Instance details

Defined in GHC.Classes

Methods

(==) :: Char -> Char -> Bool #

(/=) :: Char -> Char -> Bool #

Ord Char 
Instance details

Defined in GHC.Classes

Methods

compare :: Char -> Char -> Ordering #

(<) :: Char -> Char -> Bool #

(<=) :: Char -> Char -> Bool #

(>) :: Char -> Char -> Bool #

(>=) :: Char -> Char -> Bool #

max :: Char -> Char -> Char #

min :: Char -> Char -> Char #

Hashable Char 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Char -> Int #

hash :: Char -> Int #

AsJSON String 
Instance details

Defined in Data.Aeson.Lens

Methods

_JSON :: (FromJSON a, ToJSON b) => Prism String String a b #

AsNumber String 
Instance details

Defined in Data.Aeson.Lens

AsValue String 
Instance details

Defined in Data.Aeson.Lens

IsKey String 
Instance details

Defined in Data.Aeson.Lens

Methods

_Key :: Iso' String Key #

Pretty Char

Instead of (pretty 'n'), consider using line as a more readable alternative.

>>> pretty 'f' <> pretty 'o' <> pretty 'o'
foo
>>> pretty ("string" :: String)
string
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Char -> Doc ann #

prettyList :: [Char] -> Doc ann #

Prim Char 
Instance details

Defined in Data.Primitive.Types

Uniform Char 
Instance details

Defined in System.Random.Internal

Methods

uniformM :: StatefulGen g m => g -> m Char #

UniformRange Char 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Char, Char) -> g -> m Char #

Display Char

Since: rio-0.1.0.0

Instance details

Defined in RIO.Prelude.Display

ErrorList Char 
Instance details

Defined in Control.Monad.Trans.Error

Methods

listMsg :: String -> [Char] #

Unbox Char 
Instance details

Defined in Data.Vector.Unboxed.Base

Lift Char 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Char -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Char -> Code m Char #

Vector Vector Char 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Char 
Instance details

Defined in Data.Vector.Unboxed.Base

KnownSymbol n => Reifies (n :: Symbol) String 
Instance details

Defined in Data.Reflection

Methods

reflect :: proxy n -> String #

Generic1 (URec Char :: k -> Type) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 (URec Char) :: k -> Type #

Methods

from1 :: forall (a :: k0). URec Char a -> Rep1 (URec Char) a #

to1 :: forall (a :: k0). Rep1 (URec Char) a -> URec Char a #

ToLog [Char] 
Instance details

Defined in Amazonka.Data.Log

Methods

build :: [Char] -> ByteStringBuilder #

Foldable (UChar :: TYPE LiftedRep -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => UChar m -> m #

foldMap :: Monoid m => (a -> m) -> UChar a -> m #

foldMap' :: Monoid m => (a -> m) -> UChar a -> m #

foldr :: (a -> b -> b) -> b -> UChar a -> b #

foldr' :: (a -> b -> b) -> b -> UChar a -> b #

foldl :: (b -> a -> b) -> b -> UChar a -> b #

foldl' :: (b -> a -> b) -> b -> UChar a -> b #

foldr1 :: (a -> a -> a) -> UChar a -> a #

foldl1 :: (a -> a -> a) -> UChar a -> a #

toList :: UChar a -> [a] #

null :: UChar a -> Bool #

length :: UChar a -> Int #

elem :: Eq a => a -> UChar a -> Bool #

maximum :: Ord a => UChar a -> a #

minimum :: Ord a => UChar a -> a #

sum :: Num a => UChar a -> a #

product :: Num a => UChar a -> a #

Traversable (UChar :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> UChar a -> f (UChar b) #

sequenceA :: Applicative f => UChar (f a) -> f (UChar a) #

mapM :: Monad m => (a -> m b) -> UChar a -> m (UChar b) #

sequence :: Monad m => UChar (m a) -> m (UChar a) #

Functor (URec Char :: TYPE LiftedRep -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> URec Char a -> URec Char b #

(<$) :: a -> URec Char b -> URec Char a #

Generic (URec Char p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Char p) :: Type -> Type #

Methods

from :: URec Char p -> Rep (URec Char p) x #

to :: Rep (URec Char p) x -> URec Char p #

Show (URec Char p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> URec Char p -> ShowS #

show :: URec Char p -> String #

showList :: [URec Char p] -> ShowS #

Eq (URec Char p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: URec Char p -> URec Char p -> Bool #

(/=) :: URec Char p -> URec Char p -> Bool #

Ord (URec Char p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: URec Char p -> URec Char p -> Ordering #

(<) :: URec Char p -> URec Char p -> Bool #

(<=) :: URec Char p -> URec Char p -> Bool #

(>) :: URec Char p -> URec Char p -> Bool #

(>=) :: URec Char p -> URec Char p -> Bool #

max :: URec Char p -> URec Char p -> URec Char p #

min :: URec Char p -> URec Char p -> URec Char p #

type NatNumMaxBound Char 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Char = 1114111
type Difference Char 
Instance details

Defined in Basement.Numerical.Subtractive

type PrimSize Char 
Instance details

Defined in Basement.PrimType

type PrimSize Char = 4
newtype Vector Char 
Instance details

Defined in Data.Vector.Unboxed.Base

data URec Char (p :: k)

Used for marking occurrences of Char#

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

data URec Char (p :: k) = UChar {}
newtype MVector s Char 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Char = MV_Char (MVector s Char)
type Compare (a :: Char) (b :: Char) 
Instance details

Defined in Data.Type.Ord

type Compare (a :: Char) (b :: Char) = CmpChar a b
type Rep1 (URec Char :: k -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

type Rep1 (URec Char :: k -> Type) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UChar" 'PrefixI 'True) (S1 ('MetaSel ('Just "uChar#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UChar :: k -> Type)))
type Rep (URec Char p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

type Rep (URec Char p) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UChar" 'PrefixI 'True) (S1 ('MetaSel ('Just "uChar#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UChar :: Type -> Type)))

data Double #

Double-precision floating point numbers. It is desirable that this type be at least equal in range and precision to the IEEE double-precision type.

Instances

Instances details
Arbitrary Double 
Instance details

Defined in Test.QuickCheck.Arbitrary

CoArbitrary Double 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Double -> Gen b -> Gen b #

Function Double 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Double -> b) -> Double :-> b #

FromJSON Double 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Double 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Double 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Double 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToLog Double 
Instance details

Defined in Amazonka.Data.Log

ToQuery Double 
Instance details

Defined in Amazonka.Data.Query

FromText Double 
Instance details

Defined in Amazonka.Data.Text

ToText Double 
Instance details

Defined in Amazonka.Data.Text

Methods

toText :: Double -> Text #

Data Double

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Double -> c Double #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Double #

toConstr :: Double -> Constr #

dataTypeOf :: Double -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Double) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Double) #

gmapT :: (forall b. Data b => b -> b) -> Double -> Double #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Double -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Double -> r #

gmapQ :: (forall d. Data d => d -> u) -> Double -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Double -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Double -> m Double #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Double -> m Double #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Double -> m Double #

Storable Double

Since: base-2.1

Instance details

Defined in Foreign.Storable

Floating Double

Since: base-2.1

Instance details

Defined in GHC.Float

RealFloat Double

Since: base-2.1

Instance details

Defined in GHC.Float

Read Double

Since: base-2.1

Instance details

Defined in GHC.Read

Subtractive Double 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Double #

PrimType Double 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Double :: Nat #

NFData Double 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Double -> () #

ToLogStr Double

Since: fast-logger-2.4.14

Instance details

Defined in System.Log.FastLogger.LogStr

Methods

toLogStr :: Double -> LogStr #

Eq Double

Note that due to the presence of NaN, Double's Eq instance does not satisfy reflexivity.

>>> 0/0 == (0/0 :: Double)
False

Also note that Double's Eq instance does not satisfy substitutivity:

>>> 0 == (-0 :: Double)
True
>>> recip 0 == recip (-0 :: Double)
False
Instance details

Defined in GHC.Classes

Methods

(==) :: Double -> Double -> Bool #

(/=) :: Double -> Double -> Bool #

Ord Double

Note that due to the presence of NaN, Double's Ord instance does not satisfy reflexivity.

>>> 0/0 <= (0/0 :: Double)
False

Also note that, due to the same, Ord's operator interactions are not respected by Double's instance:

>>> (0/0 :: Double) > 1
False
>>> compare (0/0 :: Double) 1
GT
Instance details

Defined in GHC.Classes

Hashable Double

Note: prior to hashable-1.3.0.0, hash 0.0 /= hash (-0.0)

The hash of NaN is not well defined.

Since: hashable-1.3.0.0

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Double -> Int #

hash :: Double -> Int #

Pretty Double
>>> pretty (exp 1 :: Double)
2.71828182845904...
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Double -> Doc ann #

prettyList :: [Double] -> Doc ann #

Prim Double 
Instance details

Defined in Data.Primitive.Types

UniformRange Double

See Floating point number caveats.

Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Double, Double) -> g -> m Double #

Display Double 
Instance details

Defined in RIO.Prelude.Display

Unbox Double 
Instance details

Defined in Data.Vector.Unboxed.Base

Lift Double 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Double -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Double -> Code m Double #

Vector Vector Double 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Double 
Instance details

Defined in Data.Vector.Unboxed.Base

Generic1 (URec Double :: k -> Type) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 (URec Double) :: k -> Type #

Methods

from1 :: forall (a :: k0). URec Double a -> Rep1 (URec Double) a #

to1 :: forall (a :: k0). Rep1 (URec Double) a -> URec Double a #

Foldable (UDouble :: TYPE LiftedRep -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => UDouble m -> m #

foldMap :: Monoid m => (a -> m) -> UDouble a -> m #

foldMap' :: Monoid m => (a -> m) -> UDouble a -> m #

foldr :: (a -> b -> b) -> b -> UDouble a -> b #

foldr' :: (a -> b -> b) -> b -> UDouble a -> b #

foldl :: (b -> a -> b) -> b -> UDouble a -> b #

foldl' :: (b -> a -> b) -> b -> UDouble a -> b #

foldr1 :: (a -> a -> a) -> UDouble a -> a #

foldl1 :: (a -> a -> a) -> UDouble a -> a #

toList :: UDouble a -> [a] #

null :: UDouble a -> Bool #

length :: UDouble a -> Int #

elem :: Eq a => a -> UDouble a -> Bool #

maximum :: Ord a => UDouble a -> a #

minimum :: Ord a => UDouble a -> a #

sum :: Num a => UDouble a -> a #

product :: Num a => UDouble a -> a #

Traversable (UDouble :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> UDouble a -> f (UDouble b) #

sequenceA :: Applicative f => UDouble (f a) -> f (UDouble a) #

mapM :: Monad m => (a -> m b) -> UDouble a -> m (UDouble b) #

sequence :: Monad m => UDouble (m a) -> m (UDouble a) #

Functor (URec Double :: TYPE LiftedRep -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> URec Double a -> URec Double b #

(<$) :: a -> URec Double b -> URec Double a #

Generic (URec Double p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Double p) :: Type -> Type #

Methods

from :: URec Double p -> Rep (URec Double p) x #

to :: Rep (URec Double p) x -> URec Double p #

Show (URec Double p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> URec Double p -> ShowS #

show :: URec Double p -> String #

showList :: [URec Double p] -> ShowS #

Eq (URec Double p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: URec Double p -> URec Double p -> Bool #

(/=) :: URec Double p -> URec Double p -> Bool #

Ord (URec Double p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: URec Double p -> URec Double p -> Ordering #

(<) :: URec Double p -> URec Double p -> Bool #

(<=) :: URec Double p -> URec Double p -> Bool #

(>) :: URec Double p -> URec Double p -> Bool #

(>=) :: URec Double p -> URec Double p -> Bool #

max :: URec Double p -> URec Double p -> URec Double p #

min :: URec Double p -> URec Double p -> URec Double p #

type Difference Double 
Instance details

Defined in Basement.Numerical.Subtractive

type PrimSize Double 
Instance details

Defined in Basement.PrimType

type PrimSize Double = 8
newtype Vector Double 
Instance details

Defined in Data.Vector.Unboxed.Base

data URec Double (p :: k)

Used for marking occurrences of Double#

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

data URec Double (p :: k) = UDouble {}
newtype MVector s Double 
Instance details

Defined in Data.Vector.Unboxed.Base

type Rep1 (URec Double :: k -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

type Rep1 (URec Double :: k -> Type) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UDouble" 'PrefixI 'True) (S1 ('MetaSel ('Just "uDouble#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UDouble :: k -> Type)))
type Rep (URec Double p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

type Rep (URec Double p) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UDouble" 'PrefixI 'True) (S1 ('MetaSel ('Just "uDouble#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UDouble :: Type -> Type)))

data Float #

Single-precision floating point numbers. It is desirable that this type be at least equal in range and precision to the IEEE single-precision type.

Instances

Instances details
Arbitrary Float 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen Float #

shrink :: Float -> [Float] #

CoArbitrary Float 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Float -> Gen b -> Gen b #

Function Float 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Float -> b) -> Float :-> b #

FromJSON Float 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Float 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Float 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Float 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToLog Float 
Instance details

Defined in Amazonka.Data.Log

Data Float

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Float -> c Float #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Float #

toConstr :: Float -> Constr #

dataTypeOf :: Float -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Float) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Float) #

gmapT :: (forall b. Data b => b -> b) -> Float -> Float #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Float -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Float -> r #

gmapQ :: (forall d. Data d => d -> u) -> Float -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Float -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Float -> m Float #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Float -> m Float #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Float -> m Float #

Storable Float

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Float -> Int #

alignment :: Float -> Int #

peekElemOff :: Ptr Float -> Int -> IO Float #

pokeElemOff :: Ptr Float -> Int -> Float -> IO () #

peekByteOff :: Ptr b -> Int -> IO Float #

pokeByteOff :: Ptr b -> Int -> Float -> IO () #

peek :: Ptr Float -> IO Float #

poke :: Ptr Float -> Float -> IO () #

Floating Float

Since: base-2.1

Instance details

Defined in GHC.Float

RealFloat Float

Since: base-2.1

Instance details

Defined in GHC.Float

Read Float

Since: base-2.1

Instance details

Defined in GHC.Read

Subtractive Float 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Float #

Methods

(-) :: Float -> Float -> Difference Float #

PrimType Float 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Float :: Nat #

NFData Float 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Float -> () #

ToLogStr Float

Since: fast-logger-2.4.14

Instance details

Defined in System.Log.FastLogger.LogStr

Methods

toLogStr :: Float -> LogStr #

Eq Float

Note that due to the presence of NaN, Float's Eq instance does not satisfy reflexivity.

>>> 0/0 == (0/0 :: Float)
False

Also note that Float's Eq instance does not satisfy extensionality:

>>> 0 == (-0 :: Float)
True
>>> recip 0 == recip (-0 :: Float)
False
Instance details

Defined in GHC.Classes

Methods

(==) :: Float -> Float -> Bool #

(/=) :: Float -> Float -> Bool #

Ord Float

Note that due to the presence of NaN, Float's Ord instance does not satisfy reflexivity.

>>> 0/0 <= (0/0 :: Float)
False

Also note that, due to the same, Ord's operator interactions are not respected by Float's instance:

>>> (0/0 :: Float) > 1
False
>>> compare (0/0 :: Float) 1
GT
Instance details

Defined in GHC.Classes

Methods

compare :: Float -> Float -> Ordering #

(<) :: Float -> Float -> Bool #

(<=) :: Float -> Float -> Bool #

(>) :: Float -> Float -> Bool #

(>=) :: Float -> Float -> Bool #

max :: Float -> Float -> Float #

min :: Float -> Float -> Float #

Hashable Float

Note: prior to hashable-1.3.0.0, hash 0.0 /= hash (-0.0)

The hash of NaN is not well defined.

Since: hashable-1.3.0.0

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Float -> Int #

hash :: Float -> Int #

Pretty Float
>>> pretty (pi :: Float)
3.1415927
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Float -> Doc ann #

prettyList :: [Float] -> Doc ann #

Prim Float 
Instance details

Defined in Data.Primitive.Types

UniformRange Float

See Floating point number caveats.

Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Float, Float) -> g -> m Float #

Display Float

Since: rio-0.1.0.0

Instance details

Defined in RIO.Prelude.Display

Unbox Float 
Instance details

Defined in Data.Vector.Unboxed.Base

Lift Float 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Float -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Float -> Code m Float #

Vector Vector Float 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Float 
Instance details

Defined in Data.Vector.Unboxed.Base

Generic1 (URec Float :: k -> Type) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 (URec Float) :: k -> Type #

Methods

from1 :: forall (a :: k0). URec Float a -> Rep1 (URec Float) a #

to1 :: forall (a :: k0). Rep1 (URec Float) a -> URec Float a #

Foldable (UFloat :: TYPE LiftedRep -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => UFloat m -> m #

foldMap :: Monoid m => (a -> m) -> UFloat a -> m #

foldMap' :: Monoid m => (a -> m) -> UFloat a -> m #

foldr :: (a -> b -> b) -> b -> UFloat a -> b #

foldr' :: (a -> b -> b) -> b -> UFloat a -> b #

foldl :: (b -> a -> b) -> b -> UFloat a -> b #

foldl' :: (b -> a -> b) -> b -> UFloat a -> b #

foldr1 :: (a -> a -> a) -> UFloat a -> a #

foldl1 :: (a -> a -> a) -> UFloat a -> a #

toList :: UFloat a -> [a] #

null :: UFloat a -> Bool #

length :: UFloat a -> Int #

elem :: Eq a => a -> UFloat a -> Bool #

maximum :: Ord a => UFloat a -> a #

minimum :: Ord a => UFloat a -> a #

sum :: Num a => UFloat a -> a #

product :: Num a => UFloat a -> a #

Traversable (UFloat :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> UFloat a -> f (UFloat b) #

sequenceA :: Applicative f => UFloat (f a) -> f (UFloat a) #

mapM :: Monad m => (a -> m b) -> UFloat a -> m (UFloat b) #

sequence :: Monad m => UFloat (m a) -> m (UFloat a) #

Functor (URec Float :: TYPE LiftedRep -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> URec Float a -> URec Float b #

(<$) :: a -> URec Float b -> URec Float a #

Generic (URec Float p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Float p) :: Type -> Type #

Methods

from :: URec Float p -> Rep (URec Float p) x #

to :: Rep (URec Float p) x -> URec Float p #

Show (URec Float p) 
Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> URec Float p -> ShowS #

show :: URec Float p -> String #

showList :: [URec Float p] -> ShowS #

Eq (URec Float p) 
Instance details

Defined in GHC.Generics

Methods

(==) :: URec Float p -> URec Float p -> Bool #

(/=) :: URec Float p -> URec Float p -> Bool #

Ord (URec Float p) 
Instance details

Defined in GHC.Generics

Methods

compare :: URec Float p -> URec Float p -> Ordering #

(<) :: URec Float p -> URec Float p -> Bool #

(<=) :: URec Float p -> URec Float p -> Bool #

(>) :: URec Float p -> URec Float p -> Bool #

(>=) :: URec Float p -> URec Float p -> Bool #

max :: URec Float p -> URec Float p -> URec Float p #

min :: URec Float p -> URec Float p -> URec Float p #

type Difference Float 
Instance details

Defined in Basement.Numerical.Subtractive

type PrimSize Float 
Instance details

Defined in Basement.PrimType

type PrimSize Float = 4
newtype Vector Float 
Instance details

Defined in Data.Vector.Unboxed.Base

data URec Float (p :: k)

Used for marking occurrences of Float#

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

data URec Float (p :: k) = UFloat {}
newtype MVector s Float 
Instance details

Defined in Data.Vector.Unboxed.Base

type Rep1 (URec Float :: k -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

type Rep1 (URec Float :: k -> Type) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UFloat" 'PrefixI 'True) (S1 ('MetaSel ('Just "uFloat#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UFloat :: k -> Type)))
type Rep (URec Float p) 
Instance details

Defined in GHC.Generics

type Rep (URec Float p) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UFloat" 'PrefixI 'True) (S1 ('MetaSel ('Just "uFloat#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UFloat :: Type -> Type)))

data Int #

A fixed-precision integer type with at least the range [-2^29 .. 2^29-1]. The exact range for a given implementation can be determined by using minBound and maxBound from the Bounded class.

Instances

Instances details
Arbitrary Int 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen Int #

shrink :: Int -> [Int] #

CoArbitrary Int 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Int -> Gen b -> Gen b #

Function Int 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Int -> b) -> Int :-> b #

FromJSON Int 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Int 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Int 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Int 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToLog Int 
Instance details

Defined in Amazonka.Data.Log

ToQuery Int 
Instance details

Defined in Amazonka.Data.Query

Methods

toQuery :: Int -> QueryString #

FromText Int 
Instance details

Defined in Amazonka.Data.Text

ToText Int 
Instance details

Defined in Amazonka.Data.Text

Methods

toText :: Int -> Text #

Data Int

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Int -> c Int #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Int #

toConstr :: Int -> Constr #

dataTypeOf :: Int -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Int) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Int) #

gmapT :: (forall b. Data b => b -> b) -> Int -> Int #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Int -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Int -> r #

gmapQ :: (forall d. Data d => d -> u) -> Int -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Int -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Int -> m Int #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Int -> m Int #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Int -> m Int #

Storable Int

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Int -> Int #

alignment :: Int -> Int #

peekElemOff :: Ptr Int -> Int -> IO Int #

pokeElemOff :: Ptr Int -> Int -> Int -> IO () #

peekByteOff :: Ptr b -> Int -> IO Int #

pokeByteOff :: Ptr b -> Int -> Int -> IO () #

peek :: Ptr Int -> IO Int #

poke :: Ptr Int -> Int -> IO () #

Bounded Int

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

minBound :: Int #

maxBound :: Int #

Enum Int

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

succ :: Int -> Int #

pred :: Int -> Int #

toEnum :: Int -> Int #

fromEnum :: Int -> Int #

enumFrom :: Int -> [Int] #

enumFromThen :: Int -> Int -> [Int] #

enumFromTo :: Int -> Int -> [Int] #

enumFromThenTo :: Int -> Int -> Int -> [Int] #

Num Int

Since: base-2.1

Instance details

Defined in GHC.Num

Methods

(+) :: Int -> Int -> Int #

(-) :: Int -> Int -> Int #

(*) :: Int -> Int -> Int #

negate :: Int -> Int #

abs :: Int -> Int #

signum :: Int -> Int #

fromInteger :: Integer -> Int #

Read Int

Since: base-2.1

Instance details

Defined in GHC.Read

Integral Int

Since: base-2.0.1

Instance details

Defined in GHC.Real

Methods

quot :: Int -> Int -> Int #

rem :: Int -> Int -> Int #

div :: Int -> Int -> Int #

mod :: Int -> Int -> Int #

quotRem :: Int -> Int -> (Int, Int) #

divMod :: Int -> Int -> (Int, Int) #

toInteger :: Int -> Integer #

Real Int

Since: base-2.0.1

Instance details

Defined in GHC.Real

Methods

toRational :: Int -> Rational #

Show Int

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Int -> ShowS #

show :: Int -> String #

showList :: [Int] -> ShowS #

Subtractive Int 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Int #

Methods

(-) :: Int -> Int -> Difference Int #

PrimMemoryComparable Int 
Instance details

Defined in Basement.PrimType

PrimType Int 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Int :: Nat #

NFData Int 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int -> () #

ToLogStr Int

Since: fast-logger-2.4.14

Instance details

Defined in System.Log.FastLogger.LogStr

Methods

toLogStr :: Int -> LogStr #

Eq Int 
Instance details

Defined in GHC.Classes

Methods

(==) :: Int -> Int -> Bool #

(/=) :: Int -> Int -> Bool #

Ord Int 
Instance details

Defined in GHC.Classes

Methods

compare :: Int -> Int -> Ordering #

(<) :: Int -> Int -> Bool #

(<=) :: Int -> Int -> Bool #

(>) :: Int -> Int -> Bool #

(>=) :: Int -> Int -> Bool #

max :: Int -> Int -> Int #

min :: Int -> Int -> Int #

Hashable Int 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int -> Int #

hash :: Int -> Int #

Pretty Int
>>> pretty (123 :: Int)
123
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Int -> Doc ann #

prettyList :: [Int] -> Doc ann #

Prim Int 
Instance details

Defined in Data.Primitive.Types

Uniform Int 
Instance details

Defined in System.Random.Internal

Methods

uniformM :: StatefulGen g m => g -> m Int #

UniformRange Int 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Int, Int) -> g -> m Int #

Display Int

Since: rio-0.1.0.0

Instance details

Defined in RIO.Prelude.Display

ByteSource Int 
Instance details

Defined in Data.UUID.Types.Internal.Builder

Methods

(/-/) :: ByteSink Int g -> Int -> g

Unbox Int 
Instance details

Defined in Data.Vector.Unboxed.Base

Lift Int 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Int -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Int -> Code m Int #

Vector Vector Int 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Int 
Instance details

Defined in Data.Vector.Unboxed.Base

Reifies Z Int 
Instance details

Defined in Data.Reflection

Methods

reflect :: proxy Z -> Int #

Reifies n Int => Reifies (D n :: Type) Int 
Instance details

Defined in Data.Reflection

Methods

reflect :: proxy (D n) -> Int #

Reifies n Int => Reifies (PD n :: Type) Int 
Instance details

Defined in Data.Reflection

Methods

reflect :: proxy (PD n) -> Int #

Reifies n Int => Reifies (SD n :: Type) Int 
Instance details

Defined in Data.Reflection

Methods

reflect :: proxy (SD n) -> Int #

Generic1 (URec Int :: k -> Type) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 (URec Int) :: k -> Type #

Methods

from1 :: forall (a :: k0). URec Int a -> Rep1 (URec Int) a #

to1 :: forall (a :: k0). Rep1 (URec Int) a -> URec Int a #

Foldable (UInt :: TYPE LiftedRep -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => UInt m -> m #

foldMap :: Monoid m => (a -> m) -> UInt a -> m #

foldMap' :: Monoid m => (a -> m) -> UInt a -> m #

foldr :: (a -> b -> b) -> b -> UInt a -> b #

foldr' :: (a -> b -> b) -> b -> UInt a -> b #

foldl :: (b -> a -> b) -> b -> UInt a -> b #

foldl' :: (b -> a -> b) -> b -> UInt a -> b #

foldr1 :: (a -> a -> a) -> UInt a -> a #

foldl1 :: (a -> a -> a) -> UInt a -> a #

toList :: UInt a -> [a] #

null :: UInt a -> Bool #

length :: UInt a -> Int #

elem :: Eq a => a -> UInt a -> Bool #

maximum :: Ord a => UInt a -> a #

minimum :: Ord a => UInt a -> a #

sum :: Num a => UInt a -> a #

product :: Num a => UInt a -> a #

Traversable (UInt :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> UInt a -> f (UInt b) #

sequenceA :: Applicative f => UInt (f a) -> f (UInt a) #

mapM :: Monad m => (a -> m b) -> UInt a -> m (UInt b) #

sequence :: Monad m => UInt (m a) -> m (UInt a) #

Functor (URec Int :: TYPE LiftedRep -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> URec Int a -> URec Int b #

(<$) :: a -> URec Int b -> URec Int a #

Generic (URec Int p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Int p) :: Type -> Type #

Methods

from :: URec Int p -> Rep (URec Int p) x #

to :: Rep (URec Int p) x -> URec Int p #

Show (URec Int p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> URec Int p -> ShowS #

show :: URec Int p -> String #

showList :: [URec Int p] -> ShowS #

Eq (URec Int p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: URec Int p -> URec Int p -> Bool #

(/=) :: URec Int p -> URec Int p -> Bool #

Ord (URec Int p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: URec Int p -> URec Int p -> Ordering #

(<) :: URec Int p -> URec Int p -> Bool #

(<=) :: URec Int p -> URec Int p -> Bool #

(>) :: URec Int p -> URec Int p -> Bool #

(>=) :: URec Int p -> URec Int p -> Bool #

max :: URec Int p -> URec Int p -> URec Int p #

min :: URec Int p -> URec Int p -> URec Int p #

type NatNumMaxBound Int 
Instance details

Defined in Basement.Nat

type Difference Int 
Instance details

Defined in Basement.Numerical.Subtractive

type PrimSize Int 
Instance details

Defined in Basement.PrimType

type PrimSize Int = 8
newtype Vector Int 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector Int = V_Int (Vector Int)
data URec Int (p :: k)

Used for marking occurrences of Int#

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

data URec Int (p :: k) = UInt {}
type ByteSink Int g 
Instance details

Defined in Data.UUID.Types.Internal.Builder

type ByteSink Int g = Takes4Bytes g
newtype MVector s Int 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Int = MV_Int (MVector s Int)
type Rep1 (URec Int :: k -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

type Rep1 (URec Int :: k -> Type) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UInt" 'PrefixI 'True) (S1 ('MetaSel ('Just "uInt#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UInt :: k -> Type)))
type Rep (URec Int p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

type Rep (URec Int p) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UInt" 'PrefixI 'True) (S1 ('MetaSel ('Just "uInt#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UInt :: Type -> Type)))

data Int8 #

8-bit signed integer type

Instances

Instances details
Arbitrary Int8 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen Int8 #

shrink :: Int8 -> [Int8] #

CoArbitrary Int8 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Int8 -> Gen b -> Gen b #

Function Int8 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Int8 -> b) -> Int8 :-> b #

FromJSON Int8 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Int8 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Int8 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Int8 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToLog Int8 
Instance details

Defined in Amazonka.Data.Log

Data Int8

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Int8 -> c Int8 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Int8 #

toConstr :: Int8 -> Constr #

dataTypeOf :: Int8 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Int8) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Int8) #

gmapT :: (forall b. Data b => b -> b) -> Int8 -> Int8 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Int8 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Int8 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Int8 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Int8 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Int8 -> m Int8 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Int8 -> m Int8 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Int8 -> m Int8 #

Storable Int8

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Int8 -> Int #

alignment :: Int8 -> Int #

peekElemOff :: Ptr Int8 -> Int -> IO Int8 #

pokeElemOff :: Ptr Int8 -> Int -> Int8 -> IO () #

peekByteOff :: Ptr b -> Int -> IO Int8 #

pokeByteOff :: Ptr b -> Int -> Int8 -> IO () #

peek :: Ptr Int8 -> IO Int8 #

poke :: Ptr Int8 -> Int8 -> IO () #

Bits Int8

Since: base-2.1

Instance details

Defined in GHC.Int

FiniteBits Int8

Since: base-4.6.0.0

Instance details

Defined in GHC.Int

Bounded Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Enum Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

succ :: Int8 -> Int8 #

pred :: Int8 -> Int8 #

toEnum :: Int -> Int8 #

fromEnum :: Int8 -> Int #

enumFrom :: Int8 -> [Int8] #

enumFromThen :: Int8 -> Int8 -> [Int8] #

enumFromTo :: Int8 -> Int8 -> [Int8] #

enumFromThenTo :: Int8 -> Int8 -> Int8 -> [Int8] #

Ix Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

range :: (Int8, Int8) -> [Int8] #

index :: (Int8, Int8) -> Int8 -> Int #

unsafeIndex :: (Int8, Int8) -> Int8 -> Int #

inRange :: (Int8, Int8) -> Int8 -> Bool #

rangeSize :: (Int8, Int8) -> Int #

unsafeRangeSize :: (Int8, Int8) -> Int #

Num Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

(+) :: Int8 -> Int8 -> Int8 #

(-) :: Int8 -> Int8 -> Int8 #

(*) :: Int8 -> Int8 -> Int8 #

negate :: Int8 -> Int8 #

abs :: Int8 -> Int8 #

signum :: Int8 -> Int8 #

fromInteger :: Integer -> Int8 #

Read Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Integral Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

quot :: Int8 -> Int8 -> Int8 #

rem :: Int8 -> Int8 -> Int8 #

div :: Int8 -> Int8 -> Int8 #

mod :: Int8 -> Int8 -> Int8 #

quotRem :: Int8 -> Int8 -> (Int8, Int8) #

divMod :: Int8 -> Int8 -> (Int8, Int8) #

toInteger :: Int8 -> Integer #

Real Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

toRational :: Int8 -> Rational #

Show Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

showsPrec :: Int -> Int8 -> ShowS #

show :: Int8 -> String #

showList :: [Int8] -> ShowS #

BitOps Int8 
Instance details

Defined in Basement.Bits

FiniteBitsOps Int8 
Instance details

Defined in Basement.Bits

Subtractive Int8 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Int8 #

Methods

(-) :: Int8 -> Int8 -> Difference Int8 #

PrimMemoryComparable Int8 
Instance details

Defined in Basement.PrimType

PrimType Int8 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Int8 :: Nat #

NFData Int8 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int8 -> () #

ToLogStr Int8

Since: fast-logger-2.4.14

Instance details

Defined in System.Log.FastLogger.LogStr

Methods

toLogStr :: Int8 -> LogStr #

Eq Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

(==) :: Int8 -> Int8 -> Bool #

(/=) :: Int8 -> Int8 -> Bool #

Ord Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

compare :: Int8 -> Int8 -> Ordering #

(<) :: Int8 -> Int8 -> Bool #

(<=) :: Int8 -> Int8 -> Bool #

(>) :: Int8 -> Int8 -> Bool #

(>=) :: Int8 -> Int8 -> Bool #

max :: Int8 -> Int8 -> Int8 #

min :: Int8 -> Int8 -> Int8 #

Hashable Int8 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int8 -> Int #

hash :: Int8 -> Int #

Pretty Int8 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Int8 -> Doc ann #

prettyList :: [Int8] -> Doc ann #

Prim Int8 
Instance details

Defined in Data.Primitive.Types

Uniform Int8 
Instance details

Defined in System.Random.Internal

Methods

uniformM :: StatefulGen g m => g -> m Int8 #

UniformRange Int8 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Int8, Int8) -> g -> m Int8 #

Display Int8

Since: rio-0.1.0.0

Instance details

Defined in RIO.Prelude.Display

Unbox Int8 
Instance details

Defined in Data.Vector.Unboxed.Base

Lift Int8 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Int8 -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Int8 -> Code m Int8 #

Vector Vector Int8 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Int8 
Instance details

Defined in Data.Vector.Unboxed.Base

type NatNumMaxBound Int8 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Int8 = 127
type Difference Int8 
Instance details

Defined in Basement.Numerical.Subtractive

type PrimSize Int8 
Instance details

Defined in Basement.PrimType

type PrimSize Int8 = 1
newtype Vector Int8 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Int8 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Int8 = MV_Int8 (MVector s Int8)

data Int16 #

16-bit signed integer type

Instances

Instances details
Arbitrary Int16 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen Int16 #

shrink :: Int16 -> [Int16] #

CoArbitrary Int16 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Int16 -> Gen b -> Gen b #

Function Int16 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Int16 -> b) -> Int16 :-> b #

FromJSON Int16 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Int16 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Int16 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Int16 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToLog Int16 
Instance details

Defined in Amazonka.Data.Log

Data Int16

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Int16 -> c Int16 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Int16 #

toConstr :: Int16 -> Constr #

dataTypeOf :: Int16 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Int16) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Int16) #

gmapT :: (forall b. Data b => b -> b) -> Int16 -> Int16 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Int16 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Int16 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Int16 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Int16 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Int16 -> m Int16 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Int16 -> m Int16 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Int16 -> m Int16 #

Storable Int16

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Int16 -> Int #

alignment :: Int16 -> Int #

peekElemOff :: Ptr Int16 -> Int -> IO Int16 #

pokeElemOff :: Ptr Int16 -> Int -> Int16 -> IO () #

peekByteOff :: Ptr b -> Int -> IO Int16 #

pokeByteOff :: Ptr b -> Int -> Int16 -> IO () #

peek :: Ptr Int16 -> IO Int16 #

poke :: Ptr Int16 -> Int16 -> IO () #

Bits Int16

Since: base-2.1

Instance details

Defined in GHC.Int

FiniteBits Int16

Since: base-4.6.0.0

Instance details

Defined in GHC.Int

Bounded Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Enum Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Ix Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Num Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Read Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Integral Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Real Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

toRational :: Int16 -> Rational #

Show Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

showsPrec :: Int -> Int16 -> ShowS #

show :: Int16 -> String #

showList :: [Int16] -> ShowS #

BitOps Int16 
Instance details

Defined in Basement.Bits

FiniteBitsOps Int16 
Instance details

Defined in Basement.Bits

Subtractive Int16 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Int16 #

Methods

(-) :: Int16 -> Int16 -> Difference Int16 #

PrimMemoryComparable Int16 
Instance details

Defined in Basement.PrimType

PrimType Int16 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Int16 :: Nat #

NFData Int16 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int16 -> () #

ToLogStr Int16

Since: fast-logger-2.4.14

Instance details

Defined in System.Log.FastLogger.LogStr

Methods

toLogStr :: Int16 -> LogStr #

Eq Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

(==) :: Int16 -> Int16 -> Bool #

(/=) :: Int16 -> Int16 -> Bool #

Ord Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

compare :: Int16 -> Int16 -> Ordering #

(<) :: Int16 -> Int16 -> Bool #

(<=) :: Int16 -> Int16 -> Bool #

(>) :: Int16 -> Int16 -> Bool #

(>=) :: Int16 -> Int16 -> Bool #

max :: Int16 -> Int16 -> Int16 #

min :: Int16 -> Int16 -> Int16 #

Hashable Int16 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int16 -> Int #

hash :: Int16 -> Int #

Pretty Int16 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Int16 -> Doc ann #

prettyList :: [Int16] -> Doc ann #

Prim Int16 
Instance details

Defined in Data.Primitive.Types

Uniform Int16 
Instance details

Defined in System.Random.Internal

Methods

uniformM :: StatefulGen g m => g -> m Int16 #

UniformRange Int16 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Int16, Int16) -> g -> m Int16 #

Display Int16

Since: rio-0.1.0.0

Instance details

Defined in RIO.Prelude.Display

Unbox Int16 
Instance details

Defined in Data.Vector.Unboxed.Base

Lift Int16 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Int16 -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Int16 -> Code m Int16 #

Vector Vector Int16 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Int16 
Instance details

Defined in Data.Vector.Unboxed.Base

type NatNumMaxBound Int16 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Int16 = 32767
type Difference Int16 
Instance details

Defined in Basement.Numerical.Subtractive

type PrimSize Int16 
Instance details

Defined in Basement.PrimType

type PrimSize Int16 = 2
newtype Vector Int16 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Int16 
Instance details

Defined in Data.Vector.Unboxed.Base

data Int32 #

32-bit signed integer type

Instances

Instances details
Arbitrary Int32 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen Int32 #

shrink :: Int32 -> [Int32] #

CoArbitrary Int32 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Int32 -> Gen b -> Gen b #

Function Int32 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Int32 -> b) -> Int32 :-> b #

FromJSON Int32 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Int32 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Int32 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Int32 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToLog Int32 
Instance details

Defined in Amazonka.Data.Log

Data Int32

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Int32 -> c Int32 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Int32 #

toConstr :: Int32 -> Constr #

dataTypeOf :: Int32 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Int32) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Int32) #

gmapT :: (forall b. Data b => b -> b) -> Int32 -> Int32 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Int32 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Int32 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Int32 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Int32 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Int32 -> m Int32 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Int32 -> m Int32 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Int32 -> m Int32 #

Storable Int32

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Int32 -> Int #

alignment :: Int32 -> Int #

peekElemOff :: Ptr Int32 -> Int -> IO Int32 #

pokeElemOff :: Ptr Int32 -> Int -> Int32 -> IO () #

peekByteOff :: Ptr b -> Int -> IO Int32 #

pokeByteOff :: Ptr b -> Int -> Int32 -> IO () #

peek :: Ptr Int32 -> IO Int32 #

poke :: Ptr Int32 -> Int32 -> IO () #

Bits Int32

Since: base-2.1

Instance details

Defined in GHC.Int

FiniteBits Int32

Since: base-4.6.0.0

Instance details

Defined in GHC.Int

Bounded Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Enum Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Ix Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Num Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Read Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Integral Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Real Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

toRational :: Int32 -> Rational #

Show Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

showsPrec :: Int -> Int32 -> ShowS #

show :: Int32 -> String #

showList :: [Int32] -> ShowS #

BitOps Int32 
Instance details

Defined in Basement.Bits

FiniteBitsOps Int32 
Instance details

Defined in Basement.Bits

Subtractive Int32 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Int32 #

Methods

(-) :: Int32 -> Int32 -> Difference Int32 #

PrimMemoryComparable Int32 
Instance details

Defined in Basement.PrimType

PrimType Int32 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Int32 :: Nat #

NFData Int32 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int32 -> () #

ToLogStr Int32

Since: fast-logger-2.4.14

Instance details

Defined in System.Log.FastLogger.LogStr

Methods

toLogStr :: Int32 -> LogStr #

Eq Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

(==) :: Int32 -> Int32 -> Bool #

(/=) :: Int32 -> Int32 -> Bool #

Ord Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

compare :: Int32 -> Int32 -> Ordering #

(<) :: Int32 -> Int32 -> Bool #

(<=) :: Int32 -> Int32 -> Bool #

(>) :: Int32 -> Int32 -> Bool #

(>=) :: Int32 -> Int32 -> Bool #

max :: Int32 -> Int32 -> Int32 #

min :: Int32 -> Int32 -> Int32 #

Hashable Int32 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int32 -> Int #

hash :: Int32 -> Int #

Pretty Int32 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Int32 -> Doc ann #

prettyList :: [Int32] -> Doc ann #

Prim Int32 
Instance details

Defined in Data.Primitive.Types

Uniform Int32 
Instance details

Defined in System.Random.Internal

Methods

uniformM :: StatefulGen g m => g -> m Int32 #

UniformRange Int32 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Int32, Int32) -> g -> m Int32 #

Display Int32

Since: rio-0.1.0.0

Instance details

Defined in RIO.Prelude.Display

Unbox Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

Lift Int32 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Int32 -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Int32 -> Code m Int32 #

Vector Vector Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

type NatNumMaxBound Int32 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Int32 = 2147483647
type Difference Int32 
Instance details

Defined in Basement.Numerical.Subtractive

type PrimSize Int32 
Instance details

Defined in Basement.PrimType

type PrimSize Int32 = 4
newtype Vector Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

data Int64 #

64-bit signed integer type

Instances

Instances details
Arbitrary Int64 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen Int64 #

shrink :: Int64 -> [Int64] #

CoArbitrary Int64 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Int64 -> Gen b -> Gen b #

Function Int64 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Int64 -> b) -> Int64 :-> b #

FromJSON Int64 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Int64 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Int64 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Int64 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToLog Int64 
Instance details

Defined in Amazonka.Data.Log

FromText Int64 
Instance details

Defined in Amazonka.Data.Text

ToText Int64 
Instance details

Defined in Amazonka.Data.Text

Methods

toText :: Int64 -> Text #

Data Int64

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Int64 -> c Int64 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Int64 #

toConstr :: Int64 -> Constr #

dataTypeOf :: Int64 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Int64) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Int64) #

gmapT :: (forall b. Data b => b -> b) -> Int64 -> Int64 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Int64 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Int64 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Int64 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Int64 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Int64 -> m Int64 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Int64 -> m Int64 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Int64 -> m Int64 #

Storable Int64

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Int64 -> Int #

alignment :: Int64 -> Int #

peekElemOff :: Ptr Int64 -> Int -> IO Int64 #

pokeElemOff :: Ptr Int64 -> Int -> Int64 -> IO () #

peekByteOff :: Ptr b -> Int -> IO Int64 #

pokeByteOff :: Ptr b -> Int -> Int64 -> IO () #

peek :: Ptr Int64 -> IO Int64 #

poke :: Ptr Int64 -> Int64 -> IO () #

Bits Int64

Since: base-2.1

Instance details

Defined in GHC.Int

FiniteBits Int64

Since: base-4.6.0.0

Instance details

Defined in GHC.Int

Bounded Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Enum Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Ix Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Num Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Read Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Integral Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Real Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

toRational :: Int64 -> Rational #

Show Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

showsPrec :: Int -> Int64 -> ShowS #

show :: Int64 -> String #

showList :: [Int64] -> ShowS #

BitOps Int64 
Instance details

Defined in Basement.Bits

FiniteBitsOps Int64 
Instance details

Defined in Basement.Bits

Subtractive Int64 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Int64 #

Methods

(-) :: Int64 -> Int64 -> Difference Int64 #

PrimMemoryComparable Int64 
Instance details

Defined in Basement.PrimType

PrimType Int64 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Int64 :: Nat #

NFData Int64 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int64 -> () #

ToLogStr Int64

Since: fast-logger-2.4.14

Instance details

Defined in System.Log.FastLogger.LogStr

Methods

toLogStr :: Int64 -> LogStr #

Eq Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

(==) :: Int64 -> Int64 -> Bool #

(/=) :: Int64 -> Int64 -> Bool #

Ord Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

compare :: Int64 -> Int64 -> Ordering #

(<) :: Int64 -> Int64 -> Bool #

(<=) :: Int64 -> Int64 -> Bool #

(>) :: Int64 -> Int64 -> Bool #

(>=) :: Int64 -> Int64 -> Bool #

max :: Int64 -> Int64 -> Int64 #

min :: Int64 -> Int64 -> Int64 #

Hashable Int64 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int64 -> Int #

hash :: Int64 -> Int #

Pretty Int64 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Int64 -> Doc ann #

prettyList :: [Int64] -> Doc ann #

Prim Int64 
Instance details

Defined in Data.Primitive.Types

Uniform Int64 
Instance details

Defined in System.Random.Internal

Methods

uniformM :: StatefulGen g m => g -> m Int64 #

UniformRange Int64 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Int64, Int64) -> g -> m Int64 #

Display Int64

Since: rio-0.1.0.0

Instance details

Defined in RIO.Prelude.Display

Unbox Int64 
Instance details

Defined in Data.Vector.Unboxed.Base

Lift Int64 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Int64 -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Int64 -> Code m Int64 #

Vector Vector Int64 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Int64 
Instance details

Defined in Data.Vector.Unboxed.Base

type NatNumMaxBound Int64 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Int64 = 9223372036854775807
type Difference Int64 
Instance details

Defined in Basement.Numerical.Subtractive

type PrimSize Int64 
Instance details

Defined in Basement.PrimType

type PrimSize Int64 = 8
newtype Vector Int64 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Int64 
Instance details

Defined in Data.Vector.Unboxed.Base

data Integer #

Arbitrary precision integers. In contrast with fixed-size integral types such as Int, the Integer type represents the entire infinite range of integers.

Integers are stored in a kind of sign-magnitude form, hence do not expect two's complement form when using bit operations.

If the value is small (fit into an Int), IS constructor is used. Otherwise Integer and IN constructors are used to store a BigNat representing respectively the positive or the negative value magnitude.

Invariant: Integer and IN are used iff value doesn't fit in IS

Instances

Instances details
Arbitrary Integer 
Instance details

Defined in Test.QuickCheck.Arbitrary

CoArbitrary Integer 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Integer -> Gen b -> Gen b #

Function Integer 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Integer -> b) -> Integer :-> b #

FromJSON Integer

This instance includes a bounds check to prevent maliciously large inputs to fill up the memory of the target system. You can newtype Scientific and provide your own instance using withScientific if you want to allow larger inputs.

Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Integer 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Integer 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Integer 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToLog Integer 
Instance details

Defined in Amazonka.Data.Log

ToQuery Integer 
Instance details

Defined in Amazonka.Data.Query

FromText Integer 
Instance details

Defined in Amazonka.Data.Text

ToText Integer 
Instance details

Defined in Amazonka.Data.Text

Methods

toText :: Integer -> Text #

Data Integer

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Integer -> c Integer #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Integer #

toConstr :: Integer -> Constr #

dataTypeOf :: Integer -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Integer) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Integer) #

gmapT :: (forall b. Data b => b -> b) -> Integer -> Integer #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Integer -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Integer -> r #

gmapQ :: (forall d. Data d => d -> u) -> Integer -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Integer -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Integer -> m Integer #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Integer -> m Integer #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Integer -> m Integer #

Enum Integer

Since: base-2.1

Instance details

Defined in GHC.Enum

Num Integer

Since: base-2.1

Instance details

Defined in GHC.Num

Read Integer

Since: base-2.1

Instance details

Defined in GHC.Read

Integral Integer

Since: base-2.0.1

Instance details

Defined in GHC.Real

Real Integer

Since: base-2.0.1

Instance details

Defined in GHC.Real

Show Integer

Since: base-2.1

Instance details

Defined in GHC.Show

Subtractive Integer 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Integer #

NFData Integer 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Integer -> () #

ToLogStr Integer

Since: fast-logger-2.4.14

Instance details

Defined in System.Log.FastLogger.LogStr

Methods

toLogStr :: Integer -> LogStr #

Eq Integer 
Instance details

Defined in GHC.Num.Integer

Methods

(==) :: Integer -> Integer -> Bool #

(/=) :: Integer -> Integer -> Bool #

Ord Integer 
Instance details

Defined in GHC.Num.Integer

Hashable Integer 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Integer -> Int #

hash :: Integer -> Int #

Pretty Integer
>>> pretty (2^123 :: Integer)
10633823966279326983230456482242756608
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Integer -> Doc ann #

prettyList :: [Integer] -> Doc ann #

UniformRange Integer 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Integer, Integer) -> g -> m Integer #

Display Integer

Since: rio-0.1.0.0

Instance details

Defined in RIO.Prelude.Display

Lift Integer 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Integer -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Integer -> Code m Integer #

KnownNat n => Reifies (n :: Nat) Integer 
Instance details

Defined in Data.Reflection

Methods

reflect :: proxy n -> Integer #

type Difference Integer 
Instance details

Defined in Basement.Numerical.Subtractive

data Natural #

Natural number

Invariant: numbers <= 0xffffffffffffffff use the NS constructor

Instances

Instances details
FromJSON Natural 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Natural 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Natural 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Natural 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToQuery Natural 
Instance details

Defined in Amazonka.Data.Query

FromText Natural 
Instance details

Defined in Amazonka.Data.Text

ToText Natural 
Instance details

Defined in Amazonka.Data.Text

Methods

toText :: Natural -> Text #

Data Natural

Since: base-4.8.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Natural -> c Natural #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Natural #

toConstr :: Natural -> Constr #

dataTypeOf :: Natural -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Natural) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Natural) #

gmapT :: (forall b. Data b => b -> b) -> Natural -> Natural #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Natural -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Natural -> r #

gmapQ :: (forall d. Data d => d -> u) -> Natural -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Natural -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Natural -> m Natural #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Natural -> m Natural #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Natural -> m Natural #

Enum Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Enum

Num Natural

Note that Natural's Num instance isn't a ring: no element but 0 has an additive inverse. It is a semiring though.

Since: base-4.8.0.0

Instance details

Defined in GHC.Num

Read Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Read

Integral Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Real

Real Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Real

Show Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Show

Subtractive Natural 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Natural #

NFData Natural

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Natural -> () #

Eq Natural 
Instance details

Defined in GHC.Num.Natural

Methods

(==) :: Natural -> Natural -> Bool #

(/=) :: Natural -> Natural -> Bool #

Ord Natural 
Instance details

Defined in GHC.Num.Natural

Hashable Natural 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Natural -> Int #

hash :: Natural -> Int #

Pretty Natural 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Natural -> Doc ann #

prettyList :: [Natural] -> Doc ann #

UniformRange Natural 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Natural, Natural) -> g -> m Natural #

Lift Natural 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Natural -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Natural -> Code m Natural #

KnownNat n => Reifies (n :: Nat) Integer 
Instance details

Defined in Data.Reflection

Methods

reflect :: proxy n -> Integer #

type Difference Natural 
Instance details

Defined in Basement.Numerical.Subtractive

type Compare (a :: Natural) (b :: Natural) 
Instance details

Defined in Data.Type.Ord

type Compare (a :: Natural) (b :: Natural) = CmpNat a b

data Maybe a #

The Maybe type encapsulates an optional value. A value of type Maybe a either contains a value of type a (represented as Just a), or it is empty (represented as Nothing). Using Maybe is a good way to deal with errors or exceptional cases without resorting to drastic measures such as error.

The Maybe type is also a monad. It is a simple kind of error monad, where all errors are represented by Nothing. A richer error monad can be built using the Either type.

Constructors

Nothing 
Just a 

Instances

Instances details
Arbitrary1 Maybe 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitrary :: Gen a -> Gen (Maybe a) #

liftShrink :: (a -> [a]) -> Maybe a -> [Maybe a] #

FromJSON1 Maybe 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (Maybe a) #

liftParseJSONList :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [Maybe a] #

ToJSON1 Maybe 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Value) -> ([a] -> Value) -> Maybe a -> Value #

liftToJSONList :: (a -> Value) -> ([a] -> Value) -> [Maybe a] -> Value #

liftToEncoding :: (a -> Encoding) -> ([a] -> Encoding) -> Maybe a -> Encoding #

liftToEncodingList :: (a -> Encoding) -> ([a] -> Encoding) -> [Maybe a] -> Encoding #

MonadFail Maybe

Since: base-4.9.0.0

Instance details

Defined in Control.Monad.Fail

Methods

fail :: String -> Maybe a #

MonadFix Maybe

Since: base-2.1

Instance details

Defined in Control.Monad.Fix

Methods

mfix :: (a -> Maybe a) -> Maybe a #

Foldable Maybe

Since: base-2.1

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Maybe m -> m #

foldMap :: Monoid m => (a -> m) -> Maybe a -> m #

foldMap' :: Monoid m => (a -> m) -> Maybe a -> m #

foldr :: (a -> b -> b) -> b -> Maybe a -> b #

foldr' :: (a -> b -> b) -> b -> Maybe a -> b #

foldl :: (b -> a -> b) -> b -> Maybe a -> b #

foldl' :: (b -> a -> b) -> b -> Maybe a -> b #

foldr1 :: (a -> a -> a) -> Maybe a -> a #

foldl1 :: (a -> a -> a) -> Maybe a -> a #

toList :: Maybe a -> [a] #

null :: Maybe a -> Bool #

length :: Maybe a -> Int #

elem :: Eq a => a -> Maybe a -> Bool #

maximum :: Ord a => Maybe a -> a #

minimum :: Ord a => Maybe a -> a #

sum :: Num a => Maybe a -> a #

product :: Num a => Maybe a -> a #

Eq1 Maybe

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftEq :: (a -> b -> Bool) -> Maybe a -> Maybe b -> Bool #

Ord1 Maybe

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftCompare :: (a -> b -> Ordering) -> Maybe a -> Maybe b -> Ordering #

Read1 Maybe

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (Maybe a) #

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [Maybe a] #

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (Maybe a) #

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [Maybe a] #

Show1 Maybe

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Maybe a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Maybe a] -> ShowS #

Traversable Maybe

Since: base-2.1

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Maybe a -> f (Maybe b) #

sequenceA :: Applicative f => Maybe (f a) -> f (Maybe a) #

mapM :: Monad m => (a -> m b) -> Maybe a -> m (Maybe b) #

sequence :: Monad m => Maybe (m a) -> m (Maybe a) #

Alternative Maybe

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

empty :: Maybe a #

(<|>) :: Maybe a -> Maybe a -> Maybe a #

some :: Maybe a -> Maybe [a] #

many :: Maybe a -> Maybe [a] #

Applicative Maybe

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

pure :: a -> Maybe a #

(<*>) :: Maybe (a -> b) -> Maybe a -> Maybe b #

liftA2 :: (a -> b -> c) -> Maybe a -> Maybe b -> Maybe c #

(*>) :: Maybe a -> Maybe b -> Maybe b #

(<*) :: Maybe a -> Maybe b -> Maybe a #

Functor Maybe

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

fmap :: (a -> b) -> Maybe a -> Maybe b #

(<$) :: a -> Maybe b -> Maybe a #

Monad Maybe

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

(>>=) :: Maybe a -> (a -> Maybe b) -> Maybe b #

(>>) :: Maybe a -> Maybe b -> Maybe b #

return :: a -> Maybe a #

MonadPlus Maybe

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

mzero :: Maybe a #

mplus :: Maybe a -> Maybe a -> Maybe a #

MonadFailure Maybe 
Instance details

Defined in Basement.Monad

Associated Types

type Failure Maybe #

Methods

mFail :: Failure Maybe -> Maybe () #

NFData1 Maybe

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> Maybe a -> () #

MonadThrow Maybe 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> Maybe a #

Hashable1 Maybe 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> Maybe a -> Int #

Generic1 Maybe 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 Maybe :: k -> Type #

Methods

from1 :: forall (a :: k). Maybe a -> Rep1 Maybe a #

to1 :: forall (a :: k). Rep1 Maybe a -> Maybe a #

MonadBaseControl Maybe Maybe 
Instance details

Defined in Control.Monad.Trans.Control

Associated Types

type StM Maybe a #

MonadError () Maybe

Since: mtl-2.2.2

Instance details

Defined in Control.Monad.Error.Class

Methods

throwError :: () -> Maybe a #

catchError :: Maybe a -> (() -> Maybe a) -> Maybe a #

(Selector s, GToJSON' enc arity (K1 i (Maybe a) :: TYPE LiftedRep -> Type), KeyValuePair enc pairs, Monoid pairs) => RecordToPairs enc pairs arity (S1 s (K1 i (Maybe a) :: TYPE LiftedRep -> Type)) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

recordToPairs :: Options -> ToArgs enc arity a0 -> S1 s (K1 i (Maybe a)) a0 -> pairs

Lift a => Lift (Maybe a :: Type) 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Maybe a -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Maybe a -> Code m (Maybe a) #

(Selector s, FromJSON a) => RecordFromJSON' arity (S1 s (K1 i (Maybe a) :: Type -> Type)) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

recordParseJSON' :: (ConName :* (TypeName :* (Options :* FromArgs arity a0))) -> Object -> Parser (S1 s (K1 i (Maybe a)) a0)

Arbitrary a => Arbitrary (Maybe a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (Maybe a) #

shrink :: Maybe a -> [Maybe a] #

CoArbitrary a => CoArbitrary (Maybe a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Maybe a -> Gen b -> Gen b #

Function a => Function (Maybe a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Maybe a -> b) -> Maybe a :-> b #

Testable prop => Testable (Maybe prop) 
Instance details

Defined in Test.QuickCheck.Property

Methods

property :: Maybe prop -> Property #

propertyForAllShrinkShow :: Gen a -> (a -> [a]) -> (a -> [String]) -> (a -> Maybe prop) -> Property #

FromJSON a => FromJSON (Maybe a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON a => ToJSON (Maybe a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToHashedBody a => ToBody (Maybe a) 
Instance details

Defined in Amazonka.Data.Body

Methods

toBody :: Maybe a -> RequestBody #

ToLog a => ToLog (Maybe a) 
Instance details

Defined in Amazonka.Data.Log

ToQuery a => ToQuery (Maybe a) 
Instance details

Defined in Amazonka.Data.Query

Methods

toQuery :: Maybe a -> QueryString #

AWSTruncated (Maybe Bool) 
Instance details

Defined in Amazonka.Pager

Methods

truncated :: Maybe Bool -> Bool #

AWSTruncated (Maybe a) 
Instance details

Defined in Amazonka.Pager

Methods

truncated :: Maybe a -> Bool #

Data a => Data (Maybe a)

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Maybe a -> c (Maybe a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Maybe a) #

toConstr :: Maybe a -> Constr #

dataTypeOf :: Maybe a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Maybe a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Maybe a)) #

gmapT :: (forall b. Data b => b -> b) -> Maybe a -> Maybe a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Maybe a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Maybe a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Maybe a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Maybe a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Maybe a -> m (Maybe a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Maybe a -> m (Maybe a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Maybe a -> m (Maybe a) #

Semigroup a => Monoid (Maybe a)

Lift a semigroup into Maybe forming a Monoid according to http://en.wikipedia.org/wiki/Monoid: "Any semigroup S may be turned into a monoid simply by adjoining an element e not in S and defining e*e = e and e*s = s = s*e for all s ∈ S."

Since 4.11.0: constraint on inner a value generalised from Monoid to Semigroup.

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

mempty :: Maybe a #

mappend :: Maybe a -> Maybe a -> Maybe a #

mconcat :: [Maybe a] -> Maybe a #

Semigroup a => Semigroup (Maybe a)

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

(<>) :: Maybe a -> Maybe a -> Maybe a #

sconcat :: NonEmpty (Maybe a) -> Maybe a #

stimes :: Integral b => b -> Maybe a -> Maybe a #

Generic (Maybe a) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Maybe a) :: Type -> Type #

Methods

from :: Maybe a -> Rep (Maybe a) x #

to :: Rep (Maybe a) x -> Maybe a #

SingKind a => SingKind (Maybe a)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Associated Types

type DemoteRep (Maybe a)

Methods

fromSing :: forall (a0 :: Maybe a). Sing a0 -> DemoteRep (Maybe a)

Read a => Read (Maybe a)

Since: base-2.1

Instance details

Defined in GHC.Read

Show a => Show (Maybe a)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Maybe a -> ShowS #

show :: Maybe a -> String #

showList :: [Maybe a] -> ShowS #

NFData a => NFData (Maybe a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Maybe a -> () #

Eq a => Eq (Maybe a)

Since: base-2.1

Instance details

Defined in GHC.Maybe

Methods

(==) :: Maybe a -> Maybe a -> Bool #

(/=) :: Maybe a -> Maybe a -> Bool #

Ord a => Ord (Maybe a)

Since: base-2.1

Instance details

Defined in GHC.Maybe

Methods

compare :: Maybe a -> Maybe a -> Ordering #

(<) :: Maybe a -> Maybe a -> Bool #

(<=) :: Maybe a -> Maybe a -> Bool #

(>) :: Maybe a -> Maybe a -> Bool #

(>=) :: Maybe a -> Maybe a -> Bool #

max :: Maybe a -> Maybe a -> Maybe a #

min :: Maybe a -> Maybe a -> Maybe a #

Hashable a => Hashable (Maybe a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Maybe a -> Int #

hash :: Maybe a -> Int #

At (Maybe a) 
Instance details

Defined in Control.Lens.At

Methods

at :: Index (Maybe a) -> Lens' (Maybe a) (Maybe (IxValue (Maybe a))) #

Ixed (Maybe a) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (Maybe a) -> Traversal' (Maybe a) (IxValue (Maybe a)) #

MonoFoldable (Maybe a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (Maybe a) -> m) -> Maybe a -> m #

ofoldr :: (Element (Maybe a) -> b -> b) -> b -> Maybe a -> b #

ofoldl' :: (a0 -> Element (Maybe a) -> a0) -> a0 -> Maybe a -> a0 #

otoList :: Maybe a -> [Element (Maybe a)] #

oall :: (Element (Maybe a) -> Bool) -> Maybe a -> Bool #

oany :: (Element (Maybe a) -> Bool) -> Maybe a -> Bool #

onull :: Maybe a -> Bool #

olength :: Maybe a -> Int #

olength64 :: Maybe a -> Int64 #

ocompareLength :: Integral i => Maybe a -> i -> Ordering #

otraverse_ :: Applicative f => (Element (Maybe a) -> f b) -> Maybe a -> f () #

ofor_ :: Applicative f => Maybe a -> (Element (Maybe a) -> f b) -> f () #

omapM_ :: Applicative m => (Element (Maybe a) -> m ()) -> Maybe a -> m () #

oforM_ :: Applicative m => Maybe a -> (Element (Maybe a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (Maybe a) -> m a0) -> a0 -> Maybe a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (Maybe a) -> m) -> Maybe a -> m #

ofoldr1Ex :: (Element (Maybe a) -> Element (Maybe a) -> Element (Maybe a)) -> Maybe a -> Element (Maybe a) #

ofoldl1Ex' :: (Element (Maybe a) -> Element (Maybe a) -> Element (Maybe a)) -> Maybe a -> Element (Maybe a) #

headEx :: Maybe a -> Element (Maybe a) #

lastEx :: Maybe a -> Element (Maybe a) #

unsafeHead :: Maybe a -> Element (Maybe a) #

unsafeLast :: Maybe a -> Element (Maybe a) #

maximumByEx :: (Element (Maybe a) -> Element (Maybe a) -> Ordering) -> Maybe a -> Element (Maybe a) #

minimumByEx :: (Element (Maybe a) -> Element (Maybe a) -> Ordering) -> Maybe a -> Element (Maybe a) #

oelem :: Element (Maybe a) -> Maybe a -> Bool #

onotElem :: Element (Maybe a) -> Maybe a -> Bool #

MonoFunctor (Maybe a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Maybe a) -> Element (Maybe a)) -> Maybe a -> Maybe a #

MonoPointed (Maybe a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Maybe a) -> Maybe a #

MonoTraversable (Maybe a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (Maybe a) -> f (Element (Maybe a))) -> Maybe a -> f (Maybe a) #

omapM :: Applicative m => (Element (Maybe a) -> m (Element (Maybe a))) -> Maybe a -> m (Maybe a) #

Pretty a => Pretty (Maybe a)

Ignore Nothings, print Just contents.

>>> pretty (Just True)
True
>>> braces (pretty (Nothing :: Maybe Bool))
{}
>>> pretty [Just 1, Nothing, Just 3, Nothing]
[1, 3]
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Maybe a -> Doc ann #

prettyList :: [Maybe a] -> Doc ann #

SingI ('Nothing :: Maybe a)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

sing :: Sing 'Nothing

Each (Maybe a) (Maybe b) a b 
Instance details

Defined in Lens.Micro.Internal

Methods

each :: Traversal (Maybe a) (Maybe b) a b #

SingI a2 => SingI ('Just a2 :: Maybe a1)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

sing :: Sing ('Just a2)

type Failure Maybe 
Instance details

Defined in Basement.Monad

type Failure Maybe = ()
type Rep1 Maybe

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

type Rep1 Maybe = D1 ('MetaData "Maybe" "GHC.Maybe" "base" 'False) (C1 ('MetaCons "Nothing" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Just" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1))
type StM Maybe a 
Instance details

Defined in Control.Monad.Trans.Control

type StM Maybe a = a
type DemoteRep (Maybe a) 
Instance details

Defined in GHC.Generics

type DemoteRep (Maybe a) = Maybe (DemoteRep a)
type Rep (Maybe a)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

type Rep (Maybe a) = D1 ('MetaData "Maybe" "GHC.Maybe" "base" 'False) (C1 ('MetaCons "Nothing" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Just" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))
data Sing (b :: Maybe a) 
Instance details

Defined in GHC.Generics

data Sing (b :: Maybe a) where
type Index (Maybe a) 
Instance details

Defined in Control.Lens.At

type Index (Maybe a) = ()
type IxValue (Maybe a) 
Instance details

Defined in Control.Lens.At

type IxValue (Maybe a) = a
type Element (Maybe a) 
Instance details

Defined in Data.MonoTraversable

type Element (Maybe a) = a

data Ordering #

Constructors

LT 
EQ 
GT 

Instances

Instances details
Arbitrary Ordering 
Instance details

Defined in Test.QuickCheck.Arbitrary

CoArbitrary Ordering 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Ordering -> Gen b -> Gen b #

Function Ordering 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Ordering -> b) -> Ordering :-> b #

FromJSON Ordering 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Ordering 
Instance details

Defined in Data.Aeson.Types.ToJSON

Data Ordering

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Ordering -> c Ordering #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Ordering #

toConstr :: Ordering -> Constr #

dataTypeOf :: Ordering -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Ordering) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Ordering) #

gmapT :: (forall b. Data b => b -> b) -> Ordering -> Ordering #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Ordering -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Ordering -> r #

gmapQ :: (forall d. Data d => d -> u) -> Ordering -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Ordering -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Ordering -> m Ordering #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Ordering -> m Ordering #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Ordering -> m Ordering #

Monoid Ordering

Since: base-2.1

Instance details

Defined in GHC.Base

Semigroup Ordering

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Bounded Ordering

Since: base-2.1

Instance details

Defined in GHC.Enum

Enum Ordering

Since: base-2.1

Instance details

Defined in GHC.Enum

Generic Ordering 
Instance details

Defined in GHC.Generics

Associated Types

type Rep Ordering :: Type -> Type #

Methods

from :: Ordering -> Rep Ordering x #

to :: Rep Ordering x -> Ordering #

Read Ordering

Since: base-2.1

Instance details

Defined in GHC.Read

Show Ordering

Since: base-2.1

Instance details

Defined in GHC.Show

NFData Ordering 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Ordering -> () #

Eq Ordering 
Instance details

Defined in GHC.Classes

Ord Ordering 
Instance details

Defined in GHC.Classes

Hashable Ordering 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Ordering -> Int #

hash :: Ordering -> Int #

type Rep Ordering

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

type Rep Ordering = D1 ('MetaData "Ordering" "GHC.Types" "ghc-prim" 'False) (C1 ('MetaCons "LT" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "EQ" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "GT" 'PrefixI 'False) (U1 :: Type -> Type)))

type Rational = Ratio Integer #

Arbitrary-precision rational numbers, represented as a ratio of two Integer values. A rational number may be constructed using the % operator.

data IO a #

A value of type IO a is a computation which, when performed, does some I/O before returning a value of type a.

There is really only one way to "perform" an I/O action: bind it to Main.main in your program. When your program is run, the I/O will be performed. It isn't possible to perform I/O from an arbitrary function, unless that function is itself in the IO monad and called at some point, directly or indirectly, from Main.main.

IO is a monad, so IO actions can be combined using either the do-notation or the >> and >>= operations from the Monad class.

Instances

Instances details
MonadFail IO

Since: base-4.9.0.0

Instance details

Defined in Control.Monad.Fail

Methods

fail :: String -> IO a #

MonadFix IO

Since: base-2.1

Instance details

Defined in Control.Monad.Fix

Methods

mfix :: (a -> IO a) -> IO a #

MonadIO IO

Since: base-4.9.0.0

Instance details

Defined in Control.Monad.IO.Class

Methods

liftIO :: IO a -> IO a #

Alternative IO

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

empty :: IO a #

(<|>) :: IO a -> IO a -> IO a #

some :: IO a -> IO [a] #

many :: IO a -> IO [a] #

Applicative IO

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

pure :: a -> IO a #

(<*>) :: IO (a -> b) -> IO a -> IO b #

liftA2 :: (a -> b -> c) -> IO a -> IO b -> IO c #

(*>) :: IO a -> IO b -> IO b #

(<*) :: IO a -> IO b -> IO a #

Functor IO

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

fmap :: (a -> b) -> IO a -> IO b #

(<$) :: a -> IO b -> IO a #

Monad IO

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

(>>=) :: IO a -> (a -> IO b) -> IO b #

(>>) :: IO a -> IO b -> IO b #

return :: a -> IO a #

MonadPlus IO

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

mzero :: IO a #

mplus :: IO a -> IO a -> IO a #

PrimMonad IO 
Instance details

Defined in Basement.Monad

Associated Types

type PrimState IO #

type PrimVar IO :: Type -> Type #

Methods

primitive :: (State# (PrimState IO) -> (# State# (PrimState IO), a #)) -> IO a #

primThrow :: Exception e => e -> IO a #

unPrimMonad :: IO a -> State# (PrimState IO) -> (# State# (PrimState IO), a #) #

primVarNew :: a -> IO (PrimVar IO a) #

primVarRead :: PrimVar IO a -> IO a #

primVarWrite :: PrimVar IO a -> a -> IO () #

MonadCatch IO 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => IO a -> (e -> IO a) -> IO a #

MonadMask IO 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. IO a -> IO a) -> IO b) -> IO b #

uninterruptibleMask :: ((forall a. IO a -> IO a) -> IO b) -> IO b #

generalBracket :: IO a -> (a -> ExitCase b -> IO c) -> (a -> IO b) -> IO (b, c) #

MonadThrow IO 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> IO a #

PrimBase IO 
Instance details

Defined in Control.Monad.Primitive

Methods

internal :: IO a -> State# (PrimState IO) -> (# State# (PrimState IO), a #) #

PrimMonad IO 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState IO #

Methods

primitive :: (State# (PrimState IO) -> (# State# (PrimState IO), a #)) -> IO a #

Quasi IO 
Instance details

Defined in Language.Haskell.TH.Syntax

Quote IO 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

newName :: String -> IO Name #

MonadUnliftIO IO 
Instance details

Defined in Control.Monad.IO.Unlift

Methods

withRunInIO :: ((forall a. IO a -> IO a) -> IO b) -> IO b #

MonadBaseControl IO IO 
Instance details

Defined in Control.Monad.Trans.Control

Associated Types

type StM IO a #

Methods

liftBaseWith :: (RunInBase IO IO -> IO a) -> IO a #

restoreM :: StM IO a -> IO a #

MonadError IOException IO 
Instance details

Defined in Control.Monad.Error.Class

Methods

throwError :: IOException -> IO a #

catchError :: IO a -> (IOException -> IO a) -> IO a #

Monoid a => Monoid (IO a)

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

mempty :: IO a #

mappend :: IO a -> IO a -> IO a #

mconcat :: [IO a] -> IO a #

Semigroup a => Semigroup (IO a)

Since: base-4.10.0.0

Instance details

Defined in GHC.Base

Methods

(<>) :: IO a -> IO a -> IO a #

sconcat :: NonEmpty (IO a) -> IO a #

stimes :: Integral b => b -> IO a -> IO a #

MonoFunctor (IO a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (IO a) -> Element (IO a)) -> IO a -> IO a #

MonoPointed (IO a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (IO a) -> IO a #

type PrimState IO 
Instance details

Defined in Basement.Monad

type PrimVar IO 
Instance details

Defined in Basement.Monad

type PrimState IO 
Instance details

Defined in Control.Monad.Primitive

type StM IO a 
Instance details

Defined in Control.Monad.Trans.Control

type StM IO a = a
type Element (IO a) 
Instance details

Defined in Data.MonoTraversable

type Element (IO a) = a

data Word #

A Word is an unsigned integral type, with the same size as Int.

Instances

Instances details
Arbitrary Word 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen Word #

shrink :: Word -> [Word] #

CoArbitrary Word 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Word -> Gen b -> Gen b #

Function Word 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Word -> b) -> Word :-> b #

FromJSON Word 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Word 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Word 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Word 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToLog Word 
Instance details

Defined in Amazonka.Data.Log

Data Word

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Word -> c Word #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Word #

toConstr :: Word -> Constr #

dataTypeOf :: Word -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Word) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Word) #

gmapT :: (forall b. Data b => b -> b) -> Word -> Word #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Word -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Word -> r #

gmapQ :: (forall d. Data d => d -> u) -> Word -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Word -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Word -> m Word #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Word -> m Word #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Word -> m Word #

Storable Word

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Word -> Int #

alignment :: Word -> Int #

peekElemOff :: Ptr Word -> Int -> IO Word #

pokeElemOff :: Ptr Word -> Int -> Word -> IO () #

peekByteOff :: Ptr b -> Int -> IO Word #

pokeByteOff :: Ptr b -> Int -> Word -> IO () #

peek :: Ptr Word -> IO Word #

poke :: Ptr Word -> Word -> IO () #

Bounded Word

Since: base-2.1

Instance details

Defined in GHC.Enum

Enum Word

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

succ :: Word -> Word #

pred :: Word -> Word #

toEnum :: Int -> Word #

fromEnum :: Word -> Int #

enumFrom :: Word -> [Word] #

enumFromThen :: Word -> Word -> [Word] #

enumFromTo :: Word -> Word -> [Word] #

enumFromThenTo :: Word -> Word -> Word -> [Word] #

Num Word

Since: base-2.1

Instance details

Defined in GHC.Num

Methods

(+) :: Word -> Word -> Word #

(-) :: Word -> Word -> Word #

(*) :: Word -> Word -> Word #

negate :: Word -> Word #

abs :: Word -> Word #

signum :: Word -> Word #

fromInteger :: Integer -> Word #

Read Word

Since: base-4.5.0.0

Instance details

Defined in GHC.Read

Integral Word

Since: base-2.1

Instance details

Defined in GHC.Real

Methods

quot :: Word -> Word -> Word #

rem :: Word -> Word -> Word #

div :: Word -> Word -> Word #

mod :: Word -> Word -> Word #

quotRem :: Word -> Word -> (Word, Word) #

divMod :: Word -> Word -> (Word, Word) #

toInteger :: Word -> Integer #

Real Word

Since: base-2.1

Instance details

Defined in GHC.Real

Methods

toRational :: Word -> Rational #

Show Word

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Word -> ShowS #

show :: Word -> String #

showList :: [Word] -> ShowS #

BitOps Word 
Instance details

Defined in Basement.Bits

FiniteBitsOps Word 
Instance details

Defined in Basement.Bits

Subtractive Word 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Word #

Methods

(-) :: Word -> Word -> Difference Word #

PrimMemoryComparable Word 
Instance details

Defined in Basement.PrimType

PrimType Word 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Word :: Nat #

NFData Word 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word -> () #

ToLogStr Word

Since: fast-logger-2.4.14

Instance details

Defined in System.Log.FastLogger.LogStr

Methods

toLogStr :: Word -> LogStr #

Eq Word 
Instance details

Defined in GHC.Classes

Methods

(==) :: Word -> Word -> Bool #

(/=) :: Word -> Word -> Bool #

Ord Word 
Instance details

Defined in GHC.Classes

Methods

compare :: Word -> Word -> Ordering #

(<) :: Word -> Word -> Bool #

(<=) :: Word -> Word -> Bool #

(>) :: Word -> Word -> Bool #

(>=) :: Word -> Word -> Bool #

max :: Word -> Word -> Word #

min :: Word -> Word -> Word #

Hashable Word 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word -> Int #

hash :: Word -> Int #

Pretty Word 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Word -> Doc ann #

prettyList :: [Word] -> Doc ann #

Prim Word 
Instance details

Defined in Data.Primitive.Types

Uniform Word 
Instance details

Defined in System.Random.Internal

Methods

uniformM :: StatefulGen g m => g -> m Word #

UniformRange Word 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Word, Word) -> g -> m Word #

Display Word

Since: rio-0.1.0.0

Instance details

Defined in RIO.Prelude.Display

Unbox Word 
Instance details

Defined in Data.Vector.Unboxed.Base

Lift Word 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Word -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Word -> Code m Word #

Vector Vector Word 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Word 
Instance details

Defined in Data.Vector.Unboxed.Base

Generic1 (URec Word :: k -> Type) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 (URec Word) :: k -> Type #

Methods

from1 :: forall (a :: k0). URec Word a -> Rep1 (URec Word) a #

to1 :: forall (a :: k0). Rep1 (URec Word) a -> URec Word a #

Foldable (UWord :: TYPE LiftedRep -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => UWord m -> m #

foldMap :: Monoid m => (a -> m) -> UWord a -> m #

foldMap' :: Monoid m => (a -> m) -> UWord a -> m #

foldr :: (a -> b -> b) -> b -> UWord a -> b #

foldr' :: (a -> b -> b) -> b -> UWord a -> b #

foldl :: (b -> a -> b) -> b -> UWord a -> b #

foldl' :: (b -> a -> b) -> b -> UWord a -> b #

foldr1 :: (a -> a -> a) -> UWord a -> a #

foldl1 :: (a -> a -> a) -> UWord a -> a #

toList :: UWord a -> [a] #

null :: UWord a -> Bool #

length :: UWord a -> Int #

elem :: Eq a => a -> UWord a -> Bool #

maximum :: Ord a => UWord a -> a #

minimum :: Ord a => UWord a -> a #

sum :: Num a => UWord a -> a #

product :: Num a => UWord a -> a #

Traversable (UWord :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> UWord a -> f (UWord b) #

sequenceA :: Applicative f => UWord (f a) -> f (UWord a) #

mapM :: Monad m => (a -> m b) -> UWord a -> m (UWord b) #

sequence :: Monad m => UWord (m a) -> m (UWord a) #

Functor (URec Word :: TYPE LiftedRep -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> URec Word a -> URec Word b #

(<$) :: a -> URec Word b -> URec Word a #

Generic (URec Word p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Word p) :: Type -> Type #

Methods

from :: URec Word p -> Rep (URec Word p) x #

to :: Rep (URec Word p) x -> URec Word p #

Show (URec Word p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> URec Word p -> ShowS #

show :: URec Word p -> String #

showList :: [URec Word p] -> ShowS #

Eq (URec Word p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: URec Word p -> URec Word p -> Bool #

(/=) :: URec Word p -> URec Word p -> Bool #

Ord (URec Word p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: URec Word p -> URec Word p -> Ordering #

(<) :: URec Word p -> URec Word p -> Bool #

(<=) :: URec Word p -> URec Word p -> Bool #

(>) :: URec Word p -> URec Word p -> Bool #

(>=) :: URec Word p -> URec Word p -> Bool #

max :: URec Word p -> URec Word p -> URec Word p #

min :: URec Word p -> URec Word p -> URec Word p #

type NatNumMaxBound Word 
Instance details

Defined in Basement.Nat

type Difference Word 
Instance details

Defined in Basement.Numerical.Subtractive

type PrimSize Word 
Instance details

Defined in Basement.PrimType

type PrimSize Word = 8
newtype Vector Word 
Instance details

Defined in Data.Vector.Unboxed.Base

data URec Word (p :: k)

Used for marking occurrences of Word#

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

data URec Word (p :: k) = UWord {}
newtype MVector s Word 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Word = MV_Word (MVector s Word)
type Rep1 (URec Word :: k -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

type Rep1 (URec Word :: k -> Type) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UWord" 'PrefixI 'True) (S1 ('MetaSel ('Just "uWord#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UWord :: k -> Type)))
type Rep (URec Word p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

type Rep (URec Word p) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UWord" 'PrefixI 'True) (S1 ('MetaSel ('Just "uWord#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UWord :: Type -> Type)))

data Word8 #

8-bit unsigned integer type

Instances

Instances details
Arbitrary Word8 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen Word8 #

shrink :: Word8 -> [Word8] #

CoArbitrary Word8 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Word8 -> Gen b -> Gen b #

Function Word8 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Word8 -> b) -> Word8 :-> b #

FromJSON Word8 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Word8 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Word8 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Word8 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToLog Word8 
Instance details

Defined in Amazonka.Data.Log

Data Word8

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Word8 -> c Word8 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Word8 #

toConstr :: Word8 -> Constr #

dataTypeOf :: Word8 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Word8) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Word8) #

gmapT :: (forall b. Data b => b -> b) -> Word8 -> Word8 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Word8 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Word8 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Word8 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Word8 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Word8 -> m Word8 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Word8 -> m Word8 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Word8 -> m Word8 #

Storable Word8

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Word8 -> Int #

alignment :: Word8 -> Int #

peekElemOff :: Ptr Word8 -> Int -> IO Word8 #

pokeElemOff :: Ptr Word8 -> Int -> Word8 -> IO () #

peekByteOff :: Ptr b -> Int -> IO Word8 #

pokeByteOff :: Ptr b -> Int -> Word8 -> IO () #

peek :: Ptr Word8 -> IO Word8 #

poke :: Ptr Word8 -> Word8 -> IO () #

Bits Word8

Since: base-2.1

Instance details

Defined in GHC.Word

FiniteBits Word8

Since: base-4.6.0.0

Instance details

Defined in GHC.Word

Bounded Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Enum Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Ix Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Num Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Read Word8

Since: base-2.1

Instance details

Defined in GHC.Read

Integral Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Real Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Methods

toRational :: Word8 -> Rational #

Show Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Methods

showsPrec :: Int -> Word8 -> ShowS #

show :: Word8 -> String #

showList :: [Word8] -> ShowS #

BitOps Word8 
Instance details

Defined in Basement.Bits

FiniteBitsOps Word8 
Instance details

Defined in Basement.Bits

Subtractive Word8 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Word8 #

Methods

(-) :: Word8 -> Word8 -> Difference Word8 #

PrimMemoryComparable Word8 
Instance details

Defined in Basement.PrimType

PrimType Word8 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Word8 :: Nat #

NFData Word8 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word8 -> () #

ToLogStr Word8

Since: fast-logger-2.4.14

Instance details

Defined in System.Log.FastLogger.LogStr

Methods

toLogStr :: Word8 -> LogStr #

Eq Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Methods

(==) :: Word8 -> Word8 -> Bool #

(/=) :: Word8 -> Word8 -> Bool #

Ord Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Methods

compare :: Word8 -> Word8 -> Ordering #

(<) :: Word8 -> Word8 -> Bool #

(<=) :: Word8 -> Word8 -> Bool #

(>) :: Word8 -> Word8 -> Bool #

(>=) :: Word8 -> Word8 -> Bool #

max :: Word8 -> Word8 -> Word8 #

min :: Word8 -> Word8 -> Word8 #

Hashable Word8 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word8 -> Int #

hash :: Word8 -> Int #

Pretty Word8 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Word8 -> Doc ann #

prettyList :: [Word8] -> Doc ann #

Prim Word8 
Instance details

Defined in Data.Primitive.Types

Uniform Word8 
Instance details

Defined in System.Random.Internal

Methods

uniformM :: StatefulGen g m => g -> m Word8 #

UniformRange Word8 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Word8, Word8) -> g -> m Word8 #

Display Word8

Since: rio-0.1.0.0

Instance details

Defined in RIO.Prelude.Display

ByteSource Word8 
Instance details

Defined in Data.UUID.Types.Internal.Builder

Methods

(/-/) :: ByteSink Word8 g -> Word8 -> g

Unbox Word8 
Instance details

Defined in Data.Vector.Unboxed.Base

Lift Word8 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Word8 -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Word8 -> Code m Word8 #

Vector Vector Word8 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Word8 
Instance details

Defined in Data.Vector.Unboxed.Base

type NatNumMaxBound Word8 
Instance details

Defined in Basement.Nat

type Difference Word8 
Instance details

Defined in Basement.Numerical.Subtractive

type PrimSize Word8 
Instance details

Defined in Basement.PrimType

type PrimSize Word8 = 1
newtype Vector Word8 
Instance details

Defined in Data.Vector.Unboxed.Base

type ByteSink Word8 g 
Instance details

Defined in Data.UUID.Types.Internal.Builder

type ByteSink Word8 g = Takes1Byte g
newtype MVector s Word8 
Instance details

Defined in Data.Vector.Unboxed.Base

data Word16 #

16-bit unsigned integer type

Instances

Instances details
Arbitrary Word16 
Instance details

Defined in Test.QuickCheck.Arbitrary

CoArbitrary Word16 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Word16 -> Gen b -> Gen b #

Function Word16 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Word16 -> b) -> Word16 :-> b #

FromJSON Word16 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Word16 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Word16 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Word16 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToLog Word16 
Instance details

Defined in Amazonka.Data.Log

Data Word16

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Word16 -> c Word16 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Word16 #

toConstr :: Word16 -> Constr #

dataTypeOf :: Word16 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Word16) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Word16) #

gmapT :: (forall b. Data b => b -> b) -> Word16 -> Word16 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Word16 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Word16 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Word16 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Word16 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Word16 -> m Word16 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Word16 -> m Word16 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Word16 -> m Word16 #

Storable Word16

Since: base-2.1

Instance details

Defined in Foreign.Storable

Bits Word16

Since: base-2.1

Instance details

Defined in GHC.Word

FiniteBits Word16

Since: base-4.6.0.0

Instance details

Defined in GHC.Word

Bounded Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Enum Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Ix Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Num Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Read Word16

Since: base-2.1

Instance details

Defined in GHC.Read

Integral Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Real Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Show Word16

Since: base-2.1

Instance details

Defined in GHC.Word

BitOps Word16 
Instance details

Defined in Basement.Bits

FiniteBitsOps Word16 
Instance details

Defined in Basement.Bits

Subtractive Word16 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Word16 #

PrimMemoryComparable Word16 
Instance details

Defined in Basement.PrimType

PrimType Word16 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Word16 :: Nat #

NFData Word16 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word16 -> () #

ToLogStr Word16

Since: fast-logger-2.4.14

Instance details

Defined in System.Log.FastLogger.LogStr

Methods

toLogStr :: Word16 -> LogStr #

Eq Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Methods

(==) :: Word16 -> Word16 -> Bool #

(/=) :: Word16 -> Word16 -> Bool #

Ord Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Hashable Word16 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word16 -> Int #

hash :: Word16 -> Int #

Pretty Word16 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Word16 -> Doc ann #

prettyList :: [Word16] -> Doc ann #

Prim Word16 
Instance details

Defined in Data.Primitive.Types

Uniform Word16 
Instance details

Defined in System.Random.Internal

Methods

uniformM :: StatefulGen g m => g -> m Word16 #

UniformRange Word16 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Word16, Word16) -> g -> m Word16 #

Display Word16

Since: rio-0.1.0.0

Instance details

Defined in RIO.Prelude.Display

ByteSource Word16 
Instance details

Defined in Data.UUID.Types.Internal.Builder

Methods

(/-/) :: ByteSink Word16 g -> Word16 -> g

Unbox Word16 
Instance details

Defined in Data.Vector.Unboxed.Base

Lift Word16 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Word16 -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Word16 -> Code m Word16 #

Vector Vector Word16 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Word16 
Instance details

Defined in Data.Vector.Unboxed.Base

type NatNumMaxBound Word16 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Word16 = 65535
type Difference Word16 
Instance details

Defined in Basement.Numerical.Subtractive

type PrimSize Word16 
Instance details

Defined in Basement.PrimType

type PrimSize Word16 = 2
newtype Vector Word16 
Instance details

Defined in Data.Vector.Unboxed.Base

type ByteSink Word16 g 
Instance details

Defined in Data.UUID.Types.Internal.Builder

type ByteSink Word16 g = Takes2Bytes g
newtype MVector s Word16 
Instance details

Defined in Data.Vector.Unboxed.Base

data Word32 #

32-bit unsigned integer type

Instances

Instances details
Arbitrary Word32 
Instance details

Defined in Test.QuickCheck.Arbitrary

CoArbitrary Word32 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Word32 -> Gen b -> Gen b #

Function Word32 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Word32 -> b) -> Word32 :-> b #

FromJSON Word32 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Word32 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Word32 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Word32 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToLog Word32 
Instance details

Defined in Amazonka.Data.Log

Data Word32

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Word32 -> c Word32 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Word32 #

toConstr :: Word32 -> Constr #

dataTypeOf :: Word32 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Word32) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Word32) #

gmapT :: (forall b. Data b => b -> b) -> Word32 -> Word32 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Word32 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Word32 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Word32 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Word32 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Word32 -> m Word32 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Word32 -> m Word32 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Word32 -> m Word32 #

Storable Word32

Since: base-2.1

Instance details

Defined in Foreign.Storable

Bits Word32

Since: base-2.1

Instance details

Defined in GHC.Word

FiniteBits Word32

Since: base-4.6.0.0

Instance details

Defined in GHC.Word

Bounded Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Enum Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Ix Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Num Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Read Word32

Since: base-2.1

Instance details

Defined in GHC.Read

Integral Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Real Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Show Word32

Since: base-2.1

Instance details

Defined in GHC.Word

BitOps Word32 
Instance details

Defined in Basement.Bits

FiniteBitsOps Word32 
Instance details

Defined in Basement.Bits

Subtractive Word32 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Word32 #

PrimMemoryComparable Word32 
Instance details

Defined in Basement.PrimType

PrimType Word32 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Word32 :: Nat #

NFData Word32 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word32 -> () #

ToLogStr Word32

Since: fast-logger-2.4.14

Instance details

Defined in System.Log.FastLogger.LogStr

Methods

toLogStr :: Word32 -> LogStr #

Eq Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Methods

(==) :: Word32 -> Word32 -> Bool #

(/=) :: Word32 -> Word32 -> Bool #

Ord Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Hashable Word32 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word32 -> Int #

hash :: Word32 -> Int #

Pretty Word32 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Word32 -> Doc ann #

prettyList :: [Word32] -> Doc ann #

Prim Word32 
Instance details

Defined in Data.Primitive.Types

Uniform Word32 
Instance details

Defined in System.Random.Internal

Methods

uniformM :: StatefulGen g m => g -> m Word32 #

UniformRange Word32 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Word32, Word32) -> g -> m Word32 #

Display Word32

Since: rio-0.1.0.0

Instance details

Defined in RIO.Prelude.Display

ByteSource Word32 
Instance details

Defined in Data.UUID.Types.Internal.Builder

Methods

(/-/) :: ByteSink Word32 g -> Word32 -> g

Unbox Word32 
Instance details

Defined in Data.Vector.Unboxed.Base

Lift Word32 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Word32 -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Word32 -> Code m Word32 #

Vector Vector Word32 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Word32 
Instance details

Defined in Data.Vector.Unboxed.Base

type NatNumMaxBound Word32 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Word32 = 4294967295
type Difference Word32 
Instance details

Defined in Basement.Numerical.Subtractive

type PrimSize Word32 
Instance details

Defined in Basement.PrimType

type PrimSize Word32 = 4
newtype Vector Word32 
Instance details

Defined in Data.Vector.Unboxed.Base

type ByteSink Word32 g 
Instance details

Defined in Data.UUID.Types.Internal.Builder

type ByteSink Word32 g = Takes4Bytes g
newtype MVector s Word32 
Instance details

Defined in Data.Vector.Unboxed.Base

data Word64 #

64-bit unsigned integer type

Instances

Instances details
Arbitrary Word64 
Instance details

Defined in Test.QuickCheck.Arbitrary

CoArbitrary Word64 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Word64 -> Gen b -> Gen b #

Function Word64 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Word64 -> b) -> Word64 :-> b #

FromJSON Word64 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Word64 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Word64 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Word64 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToLog Word64 
Instance details

Defined in Amazonka.Data.Log

Data Word64

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Word64 -> c Word64 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Word64 #

toConstr :: Word64 -> Constr #

dataTypeOf :: Word64 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Word64) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Word64) #

gmapT :: (forall b. Data b => b -> b) -> Word64 -> Word64 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Word64 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Word64 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Word64 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Word64 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Word64 -> m Word64 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Word64 -> m Word64 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Word64 -> m Word64 #

Storable Word64

Since: base-2.1

Instance details

Defined in Foreign.Storable

Bits Word64

Since: base-2.1

Instance details

Defined in GHC.Word

FiniteBits Word64

Since: base-4.6.0.0

Instance details

Defined in GHC.Word

Bounded Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Enum Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Ix Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Num Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Read Word64

Since: base-2.1

Instance details

Defined in GHC.Read

Integral Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Real Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Show Word64

Since: base-2.1

Instance details

Defined in GHC.Word

BitOps Word64 
Instance details

Defined in Basement.Bits

FiniteBitsOps Word64 
Instance details

Defined in Basement.Bits

Subtractive Word64 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Word64 #

PrimMemoryComparable Word64 
Instance details

Defined in Basement.PrimType

PrimType Word64 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Word64 :: Nat #

NFData Word64 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word64 -> () #

ToLogStr Word64

Since: fast-logger-2.4.14

Instance details

Defined in System.Log.FastLogger.LogStr

Methods

toLogStr :: Word64 -> LogStr #

Eq Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Methods

(==) :: Word64 -> Word64 -> Bool #

(/=) :: Word64 -> Word64 -> Bool #

Ord Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Hashable Word64 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word64 -> Int #

hash :: Word64 -> Int #

Pretty Word64 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Word64 -> Doc ann #

prettyList :: [Word64] -> Doc ann #

Prim Word64 
Instance details

Defined in Data.Primitive.Types

Uniform Word64 
Instance details

Defined in System.Random.Internal

Methods

uniformM :: StatefulGen g m => g -> m Word64 #

UniformRange Word64 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Word64, Word64) -> g -> m Word64 #

Display Word64

Since: rio-0.1.0.0

Instance details

Defined in RIO.Prelude.Display

ByteSource Word64 
Instance details

Defined in Data.UUID.Types.Internal.Builder

Methods

(/-/) :: ByteSink Word64 g -> Word64 -> g

Unbox Word64 
Instance details

Defined in Data.Vector.Unboxed.Base

Lift Word64 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Word64 -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Word64 -> Code m Word64 #

Vector Vector Word64 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Word64 
Instance details

Defined in Data.Vector.Unboxed.Base

type NatNumMaxBound Word64 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Word64 = 18446744073709551615
type Difference Word64 
Instance details

Defined in Basement.Numerical.Subtractive

type PrimSize Word64 
Instance details

Defined in Basement.PrimType

type PrimSize Word64 = 8
newtype Vector Word64 
Instance details

Defined in Data.Vector.Unboxed.Base

type ByteSink Word64 g 
Instance details

Defined in Data.UUID.Types.Internal.Builder

type ByteSink Word64 g = Takes8Bytes g
newtype MVector s Word64 
Instance details

Defined in Data.Vector.Unboxed.Base

data Either a b #

The Either type represents values with two possibilities: a value of type Either a b is either Left a or Right b.

The Either type is sometimes used to represent a value which is either correct or an error; by convention, the Left constructor is used to hold an error value and the Right constructor is used to hold a correct value (mnemonic: "right" also means "correct").

Examples

Expand

The type Either String Int is the type of values which can be either a String or an Int. The Left constructor can be used only on Strings, and the Right constructor can be used only on Ints:

>>> let s = Left "foo" :: Either String Int
>>> s
Left "foo"
>>> let n = Right 3 :: Either String Int
>>> n
Right 3
>>> :type s
s :: Either String Int
>>> :type n
n :: Either String Int

The fmap from our Functor instance will ignore Left values, but will apply the supplied function to values contained in a Right:

>>> let s = Left "foo" :: Either String Int
>>> let n = Right 3 :: Either String Int
>>> fmap (*2) s
Left "foo"
>>> fmap (*2) n
Right 6

The Monad instance for Either allows us to chain together multiple actions which may fail, and fail overall if any of the individual steps failed. First we'll write a function that can either parse an Int from a Char, or fail.

>>> import Data.Char ( digitToInt, isDigit )
>>> :{
    let parseEither :: Char -> Either String Int
        parseEither c
          | isDigit c = Right (digitToInt c)
          | otherwise = Left "parse error"
>>> :}

The following should work, since both '1' and '2' can be parsed as Ints.

>>> :{
    let parseMultiple :: Either String Int
        parseMultiple = do
          x <- parseEither '1'
          y <- parseEither '2'
          return (x + y)
>>> :}
>>> parseMultiple
Right 3

But the following should fail overall, since the first operation where we attempt to parse 'm' as an Int will fail:

>>> :{
    let parseMultiple :: Either String Int
        parseMultiple = do
          x <- parseEither 'm'
          y <- parseEither '2'
          return (x + y)
>>> :}
>>> parseMultiple
Left "parse error"

Constructors

Left a 
Right b 

Instances

Instances details
Arbitrary2 Either 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitrary2 :: Gen a -> Gen b -> Gen (Either a b) #

liftShrink2 :: (a -> [a]) -> (b -> [b]) -> Either a b -> [Either a b] #

FromJSON2 Either 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON2 :: (Value -> Parser a) -> (Value -> Parser [a]) -> (Value -> Parser b) -> (Value -> Parser [b]) -> Value -> Parser (Either a b) #

liftParseJSONList2 :: (Value -> Parser a) -> (Value -> Parser [a]) -> (Value -> Parser b) -> (Value -> Parser [b]) -> Value -> Parser [Either a b] #

ToJSON2 Either 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON2 :: (a -> Value) -> ([a] -> Value) -> (b -> Value) -> ([b] -> Value) -> Either a b -> Value #

liftToJSONList2 :: (a -> Value) -> ([a] -> Value) -> (b -> Value) -> ([b] -> Value) -> [Either a b] -> Value #

liftToEncoding2 :: (a -> Encoding) -> ([a] -> Encoding) -> (b -> Encoding) -> ([b] -> Encoding) -> Either a b -> Encoding #

liftToEncodingList2 :: (a -> Encoding) -> ([a] -> Encoding) -> (b -> Encoding) -> ([b] -> Encoding) -> [Either a b] -> Encoding #

Bifoldable Either

Since: base-4.10.0.0

Instance details

Defined in Data.Bifoldable

Methods

bifold :: Monoid m => Either m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> Either a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> Either a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> Either a b -> c #

Bifunctor Either

Since: base-4.8.0.0

Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> Either a c -> Either b d #

first :: (a -> b) -> Either a c -> Either b c #

second :: (b -> c) -> Either a b -> Either a c #

Bitraversable Either

Since: base-4.10.0.0

Instance details

Defined in Data.Bitraversable

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> Either a b -> f (Either c d) #

Eq2 Either

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftEq2 :: (a -> b -> Bool) -> (c -> d -> Bool) -> Either a c -> Either b d -> Bool #

Ord2 Either

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftCompare2 :: (a -> b -> Ordering) -> (c -> d -> Ordering) -> Either a c -> Either b d -> Ordering #

Read2 Either

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftReadsPrec2 :: (Int -> ReadS a) -> ReadS [a] -> (Int -> ReadS b) -> ReadS [b] -> Int -> ReadS (Either a b) #

liftReadList2 :: (Int -> ReadS a) -> ReadS [a] -> (Int -> ReadS b) -> ReadS [b] -> ReadS [Either a b] #

liftReadPrec2 :: ReadPrec a -> ReadPrec [a] -> ReadPrec b -> ReadPrec [b] -> ReadPrec (Either a b) #

liftReadListPrec2 :: ReadPrec a -> ReadPrec [a] -> ReadPrec b -> ReadPrec [b] -> ReadPrec [Either a b] #

Show2 Either

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec2 :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> (Int -> b -> ShowS) -> ([b] -> ShowS) -> Int -> Either a b -> ShowS #

liftShowList2 :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> (Int -> b -> ShowS) -> ([b] -> ShowS) -> [Either a b] -> ShowS #

NFData2 Either

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf2 :: (a -> ()) -> (b -> ()) -> Either a b -> () #

Hashable2 Either 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt2 :: (Int -> a -> Int) -> (Int -> b -> Int) -> Int -> Either a b -> Int #

Generic1 (Either a :: Type -> Type) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 (Either a) :: k -> Type #

Methods

from1 :: forall (a0 :: k). Either a a0 -> Rep1 (Either a) a0 #

to1 :: forall (a0 :: k). Rep1 (Either a) a0 -> Either a a0 #

MonadError e (Either e) 
Instance details

Defined in Control.Monad.Error.Class

Methods

throwError :: e -> Either e a #

catchError :: Either e a -> (e -> Either e a) -> Either e a #

(Lift a, Lift b) => Lift (Either a b :: Type) 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Either a b -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Either a b -> Code m (Either a b) #

Arbitrary a => Arbitrary1 (Either a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitrary :: Gen a0 -> Gen (Either a a0) #

liftShrink :: (a0 -> [a0]) -> Either a a0 -> [Either a a0] #

FromJSON a => FromJSON1 (Either a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: (Value -> Parser a0) -> (Value -> Parser [a0]) -> Value -> Parser (Either a a0) #

liftParseJSONList :: (Value -> Parser a0) -> (Value -> Parser [a0]) -> Value -> Parser [Either a a0] #

ToJSON a => ToJSON1 (Either a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a0 -> Value) -> ([a0] -> Value) -> Either a a0 -> Value #

liftToJSONList :: (a0 -> Value) -> ([a0] -> Value) -> [Either a a0] -> Value #

liftToEncoding :: (a0 -> Encoding) -> ([a0] -> Encoding) -> Either a a0 -> Encoding #

liftToEncodingList :: (a0 -> Encoding) -> ([a0] -> Encoding) -> [Either a a0] -> Encoding #

MonadFix (Either e)

Since: base-4.3.0.0

Instance details

Defined in Control.Monad.Fix

Methods

mfix :: (a -> Either e a) -> Either e a #

Foldable (Either a)

Since: base-4.7.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Either a m -> m #

foldMap :: Monoid m => (a0 -> m) -> Either a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> Either a a0 -> m #

foldr :: (a0 -> b -> b) -> b -> Either a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Either a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> Either a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> Either a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Either a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> Either a a0 -> a0 #

toList :: Either a a0 -> [a0] #

null :: Either a a0 -> Bool #

length :: Either a a0 -> Int #

elem :: Eq a0 => a0 -> Either a a0 -> Bool #

maximum :: Ord a0 => Either a a0 -> a0 #

minimum :: Ord a0 => Either a a0 -> a0 #

sum :: Num a0 => Either a a0 -> a0 #

product :: Num a0 => Either a a0 -> a0 #

Eq a => Eq1 (Either a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftEq :: (a0 -> b -> Bool) -> Either a a0 -> Either a b -> Bool #

Ord a => Ord1 (Either a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftCompare :: (a0 -> b -> Ordering) -> Either a a0 -> Either a b -> Ordering #

Read a => Read1 (Either a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftReadsPrec :: (Int -> ReadS a0) -> ReadS [a0] -> Int -> ReadS (Either a a0) #

liftReadList :: (Int -> ReadS a0) -> ReadS [a0] -> ReadS [Either a a0] #

liftReadPrec :: ReadPrec a0 -> ReadPrec [a0] -> ReadPrec (Either a a0) #

liftReadListPrec :: ReadPrec a0 -> ReadPrec [a0] -> ReadPrec [Either a a0] #

Show a => Show1 (Either a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec :: (Int -> a0 -> ShowS) -> ([a0] -> ShowS) -> Int -> Either a a0 -> ShowS #

liftShowList :: (Int -> a0 -> ShowS) -> ([a0] -> ShowS) -> [Either a a0] -> ShowS #

Traversable (Either a)

Since: base-4.7.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a0 -> f b) -> Either a a0 -> f (Either a b) #

sequenceA :: Applicative f => Either a (f a0) -> f (Either a a0) #

mapM :: Monad m => (a0 -> m b) -> Either a a0 -> m (Either a b) #

sequence :: Monad m => Either a (m a0) -> m (Either a a0) #

Applicative (Either e)

Since: base-3.0

Instance details

Defined in Data.Either

Methods

pure :: a -> Either e a #

(<*>) :: Either e (a -> b) -> Either e a -> Either e b #

liftA2 :: (a -> b -> c) -> Either e a -> Either e b -> Either e c #

(*>) :: Either e a -> Either e b -> Either e b #

(<*) :: Either e a -> Either e b -> Either e a #

Functor (Either a)

Since: base-3.0

Instance details

Defined in Data.Either

Methods

fmap :: (a0 -> b) -> Either a a0 -> Either a b #

(<$) :: a0 -> Either a b -> Either a a0 #

Monad (Either e)

Since: base-4.4.0.0

Instance details

Defined in Data.Either

Methods

(>>=) :: Either e a -> (a -> Either e b) -> Either e b #

(>>) :: Either e a -> Either e b -> Either e b #

return :: a -> Either e a #

MonadFailure (Either a) 
Instance details

Defined in Basement.Monad

Associated Types

type Failure (Either a) #

Methods

mFail :: Failure (Either a) -> Either a () #

NFData a => NFData1 (Either a)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a0 -> ()) -> Either a a0 -> () #

e ~ SomeException => MonadCatch (Either e)

Since: exceptions-0.8.3

Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e0 => Either e a -> (e0 -> Either e a) -> Either e a #

e ~ SomeException => MonadMask (Either e)

Since: exceptions-0.8.3

Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. Either e a -> Either e a) -> Either e b) -> Either e b #

uninterruptibleMask :: ((forall a. Either e a -> Either e a) -> Either e b) -> Either e b #

generalBracket :: Either e a -> (a -> ExitCase b -> Either e c) -> (a -> Either e b) -> Either e (b, c) #

e ~ SomeException => MonadThrow (Either e) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e0 => e0 -> Either e a #

Hashable a => Hashable1 (Either a) 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a0 -> Int) -> Int -> Either a a0 -> Int #

MonadBaseControl (Either e) (Either e) 
Instance details

Defined in Control.Monad.Trans.Control

Associated Types

type StM (Either e) a #

Methods

liftBaseWith :: (RunInBase (Either e) (Either e) -> Either e a) -> Either e a #

restoreM :: StM (Either e) a -> Either e a #

(Arbitrary a, Arbitrary b) => Arbitrary (Either a b) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (Either a b) #

shrink :: Either a b -> [Either a b] #

(CoArbitrary a, CoArbitrary b) => CoArbitrary (Either a b) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Either a b -> Gen b0 -> Gen b0 #

(Function a, Function b) => Function (Either a b) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Either a b -> b0) -> Either a b :-> b0 #

(FromJSON a, FromJSON b) => FromJSON (Either a b) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Either a b) #

parseJSONList :: Value -> Parser [Either a b] #

(ToJSON a, ToJSON b) => ToJSON (Either a b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Either a b -> Value #

toEncoding :: Either a b -> Encoding #

toJSONList :: [Either a b] -> Value #

toEncodingList :: [Either a b] -> Encoding #

(Data a, Data b) => Data (Either a b)

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> Either a b -> c (Either a b) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Either a b) #

toConstr :: Either a b -> Constr #

dataTypeOf :: Either a b -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Either a b)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Either a b)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> Either a b -> Either a b #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Either a b -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Either a b -> r #

gmapQ :: (forall d. Data d => d -> u) -> Either a b -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Either a b -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Either a b -> m (Either a b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Either a b -> m (Either a b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Either a b -> m (Either a b) #

Semigroup (Either a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Either

Methods

(<>) :: Either a b -> Either a b -> Either a b #

sconcat :: NonEmpty (Either a b) -> Either a b #

stimes :: Integral b0 => b0 -> Either a b -> Either a b #

Generic (Either a b) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Either a b) :: Type -> Type #

Methods

from :: Either a b -> Rep (Either a b) x #

to :: Rep (Either a b) x -> Either a b #

(Read a, Read b) => Read (Either a b)

Since: base-3.0

Instance details

Defined in Data.Either

(Show a, Show b) => Show (Either a b)

Since: base-3.0

Instance details

Defined in Data.Either

Methods

showsPrec :: Int -> Either a b -> ShowS #

show :: Either a b -> String #

showList :: [Either a b] -> ShowS #

(NFData a, NFData b) => NFData (Either a b) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Either a b -> () #

(Eq a, Eq b) => Eq (Either a b)

Since: base-2.1

Instance details

Defined in Data.Either

Methods

(==) :: Either a b -> Either a b -> Bool #

(/=) :: Either a b -> Either a b -> Bool #

(Ord a, Ord b) => Ord (Either a b)

Since: base-2.1

Instance details

Defined in Data.Either

Methods

compare :: Either a b -> Either a b -> Ordering #

(<) :: Either a b -> Either a b -> Bool #

(<=) :: Either a b -> Either a b -> Bool #

(>) :: Either a b -> Either a b -> Bool #

(>=) :: Either a b -> Either a b -> Bool #

max :: Either a b -> Either a b -> Either a b #

min :: Either a b -> Either a b -> Either a b #

(Hashable a, Hashable b) => Hashable (Either a b) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Either a b -> Int #

hash :: Either a b -> Int #

MonoFoldable (Either a b) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (Either a b) -> m) -> Either a b -> m #

ofoldr :: (Element (Either a b) -> b0 -> b0) -> b0 -> Either a b -> b0 #

ofoldl' :: (a0 -> Element (Either a b) -> a0) -> a0 -> Either a b -> a0 #

otoList :: Either a b -> [Element (Either a b)] #

oall :: (Element (Either a b) -> Bool) -> Either a b -> Bool #

oany :: (Element (Either a b) -> Bool) -> Either a b -> Bool #

onull :: Either a b -> Bool #

olength :: Either a b -> Int #

olength64 :: Either a b -> Int64 #

ocompareLength :: Integral i => Either a b -> i -> Ordering #

otraverse_ :: Applicative f => (Element (Either a b) -> f b0) -> Either a b -> f () #

ofor_ :: Applicative f => Either a b -> (Element (Either a b) -> f b0) -> f () #

omapM_ :: Applicative m => (Element (Either a b) -> m ()) -> Either a b -> m () #

oforM_ :: Applicative m => Either a b -> (Element (Either a b) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (Either a b) -> m a0) -> a0 -> Either a b -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (Either a b) -> m) -> Either a b -> m #

ofoldr1Ex :: (Element (Either a b) -> Element (Either a b) -> Element (Either a b)) -> Either a b -> Element (Either a b) #

ofoldl1Ex' :: (Element (Either a b) -> Element (Either a b) -> Element (Either a b)) -> Either a b -> Element (Either a b) #

headEx :: Either a b -> Element (Either a b) #

lastEx :: Either a b -> Element (Either a b) #

unsafeHead :: Either a b -> Element (Either a b) #

unsafeLast :: Either a b -> Element (Either a b) #

maximumByEx :: (Element (Either a b) -> Element (Either a b) -> Ordering) -> Either a b -> Element (Either a b) #

minimumByEx :: (Element (Either a b) -> Element (Either a b) -> Ordering) -> Either a b -> Element (Either a b) #

oelem :: Element (Either a b) -> Either a b -> Bool #

onotElem :: Element (Either a b) -> Either a b -> Bool #

MonoFunctor (Either a b) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Either a b) -> Element (Either a b)) -> Either a b -> Either a b #

MonoPointed (Either a b) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Either a b) -> Either a b #

MonoTraversable (Either a b) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (Either a b) -> f (Element (Either a b))) -> Either a b -> f (Either a b) #

omapM :: Applicative m => (Element (Either a b) -> m (Element (Either a b))) -> Either a b -> m (Either a b) #

(a ~ a', b ~ b') => Each (Either a a') (Either b b') a b

Since: microlens-0.4.11

Instance details

Defined in Lens.Micro.Internal

Methods

each :: Traversal (Either a a') (Either b b') a b #

type Rep1 (Either a :: Type -> Type)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

type Failure (Either a) 
Instance details

Defined in Basement.Monad

type Failure (Either a) = a
type StM (Either e) a 
Instance details

Defined in Control.Monad.Trans.Control

type StM (Either e) a = a
type Rep (Either a b)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

type Element (Either a b) 
Instance details

Defined in Data.MonoTraversable

type Element (Either a b) = b

data NonEmpty a #

Non-empty (and non-strict) list type.

Since: base-4.9.0.0

Constructors

a :| [a] infixr 5 

Instances

Instances details
FromJSON1 NonEmpty 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (NonEmpty a) #

liftParseJSONList :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [NonEmpty a] #

ToJSON1 NonEmpty 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Value) -> ([a] -> Value) -> NonEmpty a -> Value #

liftToJSONList :: (a -> Value) -> ([a] -> Value) -> [NonEmpty a] -> Value #

liftToEncoding :: (a -> Encoding) -> ([a] -> Encoding) -> NonEmpty a -> Encoding #

liftToEncodingList :: (a -> Encoding) -> ([a] -> Encoding) -> [NonEmpty a] -> Encoding #

MonadFix NonEmpty

Since: base-4.9.0.0

Instance details

Defined in Control.Monad.Fix

Methods

mfix :: (a -> NonEmpty a) -> NonEmpty a #

Foldable NonEmpty

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => NonEmpty m -> m #

foldMap :: Monoid m => (a -> m) -> NonEmpty a -> m #

foldMap' :: Monoid m => (a -> m) -> NonEmpty a -> m #

foldr :: (a -> b -> b) -> b -> NonEmpty a -> b #

foldr' :: (a -> b -> b) -> b -> NonEmpty a -> b #

foldl :: (b -> a -> b) -> b -> NonEmpty a -> b #

foldl' :: (b -> a -> b) -> b -> NonEmpty a -> b #

foldr1 :: (a -> a -> a) -> NonEmpty a -> a #

foldl1 :: (a -> a -> a) -> NonEmpty a -> a #

toList :: NonEmpty a -> [a] #

null :: NonEmpty a -> Bool #

length :: NonEmpty a -> Int #

elem :: Eq a => a -> NonEmpty a -> Bool #

maximum :: Ord a => NonEmpty a -> a #

minimum :: Ord a => NonEmpty a -> a #

sum :: Num a => NonEmpty a -> a #

product :: Num a => NonEmpty a -> a #

Eq1 NonEmpty

Since: base-4.10.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftEq :: (a -> b -> Bool) -> NonEmpty a -> NonEmpty b -> Bool #

Ord1 NonEmpty

Since: base-4.10.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftCompare :: (a -> b -> Ordering) -> NonEmpty a -> NonEmpty b -> Ordering #

Read1 NonEmpty

Since: base-4.10.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (NonEmpty a) #

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [NonEmpty a] #

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (NonEmpty a) #

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [NonEmpty a] #

Show1 NonEmpty

Since: base-4.10.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> NonEmpty a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [NonEmpty a] -> ShowS #

Traversable NonEmpty

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> NonEmpty a -> f (NonEmpty b) #

sequenceA :: Applicative f => NonEmpty (f a) -> f (NonEmpty a) #

mapM :: Monad m => (a -> m b) -> NonEmpty a -> m (NonEmpty b) #

sequence :: Monad m => NonEmpty (m a) -> m (NonEmpty a) #

Applicative NonEmpty

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

pure :: a -> NonEmpty a #

(<*>) :: NonEmpty (a -> b) -> NonEmpty a -> NonEmpty b #

liftA2 :: (a -> b -> c) -> NonEmpty a -> NonEmpty b -> NonEmpty c #

(*>) :: NonEmpty a -> NonEmpty b -> NonEmpty b #

(<*) :: NonEmpty a -> NonEmpty b -> NonEmpty a #

Functor NonEmpty

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

fmap :: (a -> b) -> NonEmpty a -> NonEmpty b #

(<$) :: a -> NonEmpty b -> NonEmpty a #

Monad NonEmpty

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

(>>=) :: NonEmpty a -> (a -> NonEmpty b) -> NonEmpty b #

(>>) :: NonEmpty a -> NonEmpty b -> NonEmpty b #

return :: a -> NonEmpty a #

NFData1 NonEmpty

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> NonEmpty a -> () #

Hashable1 NonEmpty

Since: hashable-1.3.1.0

Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> NonEmpty a -> Int #

Generic1 NonEmpty 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 NonEmpty :: k -> Type #

Methods

from1 :: forall (a :: k). NonEmpty a -> Rep1 NonEmpty a #

to1 :: forall (a :: k). Rep1 NonEmpty a -> NonEmpty a #

Lift a => Lift (NonEmpty a :: Type)

Since: template-haskell-2.15.0.0

Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => NonEmpty a -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => NonEmpty a -> Code m (NonEmpty a) #

FromJSON a => FromJSON (NonEmpty a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON a => ToJSON (NonEmpty a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Data a => Data (NonEmpty a)

Since: base-4.9.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NonEmpty a -> c (NonEmpty a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (NonEmpty a) #

toConstr :: NonEmpty a -> Constr #

dataTypeOf :: NonEmpty a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (NonEmpty a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (NonEmpty a)) #

gmapT :: (forall b. Data b => b -> b) -> NonEmpty a -> NonEmpty a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NonEmpty a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NonEmpty a -> r #

gmapQ :: (forall d. Data d => d -> u) -> NonEmpty a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> NonEmpty a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NonEmpty a -> m (NonEmpty a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NonEmpty a -> m (NonEmpty a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NonEmpty a -> m (NonEmpty a) #

Semigroup (NonEmpty a)

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

(<>) :: NonEmpty a -> NonEmpty a -> NonEmpty a #

sconcat :: NonEmpty (NonEmpty a) -> NonEmpty a #

stimes :: Integral b => b -> NonEmpty a -> NonEmpty a #

IsList (NonEmpty a)

Since: base-4.9.0.0

Instance details

Defined in GHC.Exts

Associated Types

type Item (NonEmpty a) #

Methods

fromList :: [Item (NonEmpty a)] -> NonEmpty a #

fromListN :: Int -> [Item (NonEmpty a)] -> NonEmpty a #

toList :: NonEmpty a -> [Item (NonEmpty a)] #

Generic (NonEmpty a) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (NonEmpty a) :: Type -> Type #

Methods

from :: NonEmpty a -> Rep (NonEmpty a) x #

to :: Rep (NonEmpty a) x -> NonEmpty a #

Read a => Read (NonEmpty a)

Since: base-4.11.0.0

Instance details

Defined in GHC.Read

Show a => Show (NonEmpty a)

Since: base-4.11.0.0

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> NonEmpty a -> ShowS #

show :: NonEmpty a -> String #

showList :: [NonEmpty a] -> ShowS #

NFData a => NFData (NonEmpty a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: NonEmpty a -> () #

Eq a => Eq (NonEmpty a)

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

(==) :: NonEmpty a -> NonEmpty a -> Bool #

(/=) :: NonEmpty a -> NonEmpty a -> Bool #

Ord a => Ord (NonEmpty a)

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

compare :: NonEmpty a -> NonEmpty a -> Ordering #

(<) :: NonEmpty a -> NonEmpty a -> Bool #

(<=) :: NonEmpty a -> NonEmpty a -> Bool #

(>) :: NonEmpty a -> NonEmpty a -> Bool #

(>=) :: NonEmpty a -> NonEmpty a -> Bool #

max :: NonEmpty a -> NonEmpty a -> NonEmpty a #

min :: NonEmpty a -> NonEmpty a -> NonEmpty a #

Hashable a => Hashable (NonEmpty a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> NonEmpty a -> Int #

hash :: NonEmpty a -> Int #

Ixed (NonEmpty a) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (NonEmpty a) -> Traversal' (NonEmpty a) (IxValue (NonEmpty a)) #

Wrapped (NonEmpty a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (NonEmpty a) #

Ixed (NonEmpty a) 
Instance details

Defined in Lens.Micro.Internal

Methods

ix :: Index (NonEmpty a) -> Traversal' (NonEmpty a) (IxValue (NonEmpty a)) #

GrowingAppend (NonEmpty a) 
Instance details

Defined in Data.MonoTraversable

MonoFoldable (NonEmpty a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (NonEmpty a) -> m) -> NonEmpty a -> m #

ofoldr :: (Element (NonEmpty a) -> b -> b) -> b -> NonEmpty a -> b #

ofoldl' :: (a0 -> Element (NonEmpty a) -> a0) -> a0 -> NonEmpty a -> a0 #

otoList :: NonEmpty a -> [Element (NonEmpty a)] #

oall :: (Element (NonEmpty a) -> Bool) -> NonEmpty a -> Bool #

oany :: (Element (NonEmpty a) -> Bool) -> NonEmpty a -> Bool #

onull :: NonEmpty a -> Bool #

olength :: NonEmpty a -> Int #

olength64 :: NonEmpty a -> Int64 #

ocompareLength :: Integral i => NonEmpty a -> i -> Ordering #

otraverse_ :: Applicative f => (Element (NonEmpty a) -> f b) -> NonEmpty a -> f () #

ofor_ :: Applicative f => NonEmpty a -> (Element (NonEmpty a) -> f b) -> f () #

omapM_ :: Applicative m => (Element (NonEmpty a) -> m ()) -> NonEmpty a -> m () #

oforM_ :: Applicative m => NonEmpty a -> (Element (NonEmpty a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (NonEmpty a) -> m a0) -> a0 -> NonEmpty a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (NonEmpty a) -> m) -> NonEmpty a -> m #

ofoldr1Ex :: (Element (NonEmpty a) -> Element (NonEmpty a) -> Element (NonEmpty a)) -> NonEmpty a -> Element (NonEmpty a) #

ofoldl1Ex' :: (Element (NonEmpty a) -> Element (NonEmpty a) -> Element (NonEmpty a)) -> NonEmpty a -> Element (NonEmpty a) #

headEx :: NonEmpty a -> Element (NonEmpty a) #

lastEx :: NonEmpty a -> Element (NonEmpty a) #

unsafeHead :: NonEmpty a -> Element (NonEmpty a) #

unsafeLast :: NonEmpty a -> Element (NonEmpty a) #

maximumByEx :: (Element (NonEmpty a) -> Element (NonEmpty a) -> Ordering) -> NonEmpty a -> Element (NonEmpty a) #

minimumByEx :: (Element (NonEmpty a) -> Element (NonEmpty a) -> Ordering) -> NonEmpty a -> Element (NonEmpty a) #

oelem :: Element (NonEmpty a) -> NonEmpty a -> Bool #

onotElem :: Element (NonEmpty a) -> NonEmpty a -> Bool #

MonoFunctor (NonEmpty a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (NonEmpty a) -> Element (NonEmpty a)) -> NonEmpty a -> NonEmpty a #

MonoPointed (NonEmpty a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (NonEmpty a) -> NonEmpty a #

MonoTraversable (NonEmpty a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (NonEmpty a) -> f (Element (NonEmpty a))) -> NonEmpty a -> f (NonEmpty a) #

omapM :: Applicative m => (Element (NonEmpty a) -> m (Element (NonEmpty a))) -> NonEmpty a -> m (NonEmpty a) #

SemiSequence (NonEmpty a) 
Instance details

Defined in Data.Sequences

Associated Types

type Index (NonEmpty a) #

Pretty a => Pretty (NonEmpty a) 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: NonEmpty a -> Doc ann #

prettyList :: [NonEmpty a] -> Doc ann #

t ~ NonEmpty b => Rewrapped (NonEmpty a) t 
Instance details

Defined in Control.Lens.Wrapped

Each (NonEmpty a) (NonEmpty b) a b 
Instance details

Defined in Lens.Micro.Internal

Methods

each :: Traversal (NonEmpty a) (NonEmpty b) a b #

type Rep1 NonEmpty

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

type Item (NonEmpty a) 
Instance details

Defined in GHC.Exts

type Item (NonEmpty a) = a
type Rep (NonEmpty a)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

type Index (NonEmpty a) 
Instance details

Defined in Control.Lens.At

type Index (NonEmpty a) = Int
type IxValue (NonEmpty a) 
Instance details

Defined in Control.Lens.At

type IxValue (NonEmpty a) = a
type Unwrapped (NonEmpty a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (NonEmpty a) = (a, [a])
type Index (NonEmpty a) 
Instance details

Defined in Lens.Micro.Internal

type Index (NonEmpty a) = Int
type IxValue (NonEmpty a) 
Instance details

Defined in Lens.Micro.Internal

type IxValue (NonEmpty a) = a
type Element (NonEmpty a) 
Instance details

Defined in Data.MonoTraversable

type Element (NonEmpty a) = a
type Index (NonEmpty a) 
Instance details

Defined in Data.Sequences

type Index (NonEmpty a) = Int

data CallStack #

CallStacks are a lightweight method of obtaining a partial call-stack at any point in the program.

A function can request its call-site with the HasCallStack constraint. For example, we can define

putStrLnWithCallStack :: HasCallStack => String -> IO ()

as a variant of putStrLn that will get its call-site and print it, along with the string given as argument. We can access the call-stack inside putStrLnWithCallStack with callStack.

>>> :{
putStrLnWithCallStack :: HasCallStack => String -> IO ()
putStrLnWithCallStack msg = do
  putStrLn msg
  putStrLn (prettyCallStack callStack)
:}

Thus, if we call putStrLnWithCallStack we will get a formatted call-stack alongside our string.

>>> putStrLnWithCallStack "hello"
hello
CallStack (from HasCallStack):
  putStrLnWithCallStack, called at <interactive>:... in interactive:Ghci...

GHC solves HasCallStack constraints in three steps:

  1. If there is a CallStack in scope -- i.e. the enclosing function has a HasCallStack constraint -- GHC will append the new call-site to the existing CallStack.
  2. If there is no CallStack in scope -- e.g. in the GHCi session above -- and the enclosing definition does not have an explicit type signature, GHC will infer a HasCallStack constraint for the enclosing definition (subject to the monomorphism restriction).
  3. If there is no CallStack in scope and the enclosing definition has an explicit type signature, GHC will solve the HasCallStack constraint for the singleton CallStack containing just the current call-site.

CallStacks do not interact with the RTS and do not require compilation with -prof. On the other hand, as they are built up explicitly via the HasCallStack constraints, they will generally not contain as much information as the simulated call-stacks maintained by the RTS.

A CallStack is a [(String, SrcLoc)]. The String is the name of function that was called, the SrcLoc is the call-site. The list is ordered with the most recently called function at the head.

NOTE: The intrepid user may notice that HasCallStack is just an alias for an implicit parameter ?callStack :: CallStack. This is an implementation detail and should not be considered part of the CallStack API, we may decide to change the implementation in the future.

Since: base-4.8.1.0

Instances

Instances details
IsList CallStack

Be aware that 'fromList . toList = id' only for unfrozen CallStacks, since toList removes frozenness information.

Since: base-4.9.0.0

Instance details

Defined in GHC.Exts

Associated Types

type Item CallStack #

Show CallStack

Since: base-4.9.0.0

Instance details

Defined in GHC.Show

NFData CallStack

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CallStack -> () #

type Item CallStack 
Instance details

Defined in GHC.Exts

throwString :: (MonadIO m, HasCallStack) => String -> m a #

A convenience function for throwing a user error. This is useful for cases where it would be too high a burden to define your own exception type.

This throws an exception of type StringException. When GHC supports it (base 4.9 and GHC 8.0 and onward), it includes a call stack.

Since: unliftio-0.1.0.0

data Handle #

Haskell defines operations to read and write characters from and to files, represented by values of type Handle. Each value of this type is a handle: a record used by the Haskell run-time system to manage I/O with file system objects. A handle has at least the following properties:

  • whether it manages input or output or both;
  • whether it is open, closed or semi-closed;
  • whether the object is seekable;
  • whether buffering is disabled, or enabled on a line or block basis;
  • a buffer (whose length may be zero).

Most handles will also have a current I/O position indicating where the next input or output operation will occur. A handle is readable if it manages only input or both input and output; likewise, it is writable if it manages only output or both input and output. A handle is open when first allocated. Once it is closed it can no longer be used for either input or output, though an implementation cannot re-use its storage while references remain to it. Handles are in the Show and Eq classes. The string produced by showing a handle is system dependent; it should include enough information to identify the handle for debugging. A handle is equal according to == only to itself; no attempt is made to compare the internal state of different handles for equality.

Instances

Instances details
Show Handle

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Handle.Types

Eq Handle

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Handle.Types

Methods

(==) :: Handle -> Handle -> Bool #

(/=) :: Handle -> Handle -> Bool #

runLoggerLoggingT :: (MonadUnliftIO m, HasLogger env) => env -> LoggingT m a -> m a #

data Logger #

Instances

Instances details
HasLogger Logger 
Instance details

Defined in Blammo.Logging.Internal.Logger

class HasLogger env where #

Methods

loggerL :: Lens' env Logger #

Instances

Instances details
HasLogger Logger 
Instance details

Defined in Blammo.Logging.Internal.Logger

HasLogger (App options) Source # 
Instance details

Defined in Stackctl.CLI

Methods

loggerL :: Lens' (App options) Logger #

setLogSettingsConcurrency :: Maybe Int -> LogSettings -> LogSettings #

Set the number of LoggerSet Buffers used by fast-logger

By default this matches getNumCapabilities, which is more performant but does not guarantee message order. If this matters, such as in a CLI, set this value to 1.

Support for this option depends on your version of fast-logger:

fast-logger | DestinationSupported?
>=3.1.1 | anywhereyes
>=3.0.5 | fileyes
>=3.0.5 | stdout/stderrno
<3.0.5 | anywhereno

data Message #

A Message captures a textual component and a metadata component. The metadata component is a list of SeriesElem to support tacking on arbitrary structured data to a log message.

With the OverloadedStrings extension enabled, Message values can be constructed without metadata fairly conveniently, just as if we were using Text directly:

logDebug "Some log message without metadata"

Metadata may be included in a Message via the :# constructor:

logDebug $ "Some log message with metadata" :#
  [ "bloorp" .= (42 :: Int)
  , "bonk" .= ("abc" :: Text)
  ]

The mnemonic for the :# constructor is that the # symbol is sometimes referred to as a hash, a JSON object can be thought of as a hash map, and so with :# (and enough squinting), we are cons-ing a textual message onto a JSON object. Yes, this mnemonic isn't well-typed, but hopefully it still helps!

Since: monad-logger-aeson-0.1.0.0

Constructors

Text :# [SeriesElem] infixr 5 

Instances

Instances details
IsString Message 
Instance details

Defined in Control.Monad.Logger.Aeson.Internal

Methods

fromString :: String -> Message #

ToLogStr Message 
Instance details

Defined in Control.Monad.Logger.Aeson.Internal

Methods

toLogStr :: Message -> LogStr #

logDebug :: (HasCallStack, MonadLogger m) => Message -> m () #

Logs a Message with the location provided by an implicit CallStack.

Since: monad-logger-aeson-0.1.0.0

logInfo :: (HasCallStack, MonadLogger m) => Message -> m () #

See logDebug

Since: monad-logger-aeson-0.1.0.0

logWarn :: (HasCallStack, MonadLogger m) => Message -> m () #

See logDebug

Since: monad-logger-aeson-0.1.0.0

logError :: (HasCallStack, MonadLogger m) => Message -> m () #

See logDebug

Since: monad-logger-aeson-0.1.0.0

logOther :: (HasCallStack, MonadLogger m) => LogLevel -> Message -> m () #

See logDebug

Since: monad-logger-aeson-0.1.0.0

logDebugNS :: (HasCallStack, MonadLogger m) => LogSource -> Message -> m () #

See logDebugCS

Since: monad-logger-aeson-0.1.0.0

logInfoNS :: (HasCallStack, MonadLogger m) => LogSource -> Message -> m () #

See logDebugNS

Since: monad-logger-aeson-0.1.0.0

logWarnNS :: (HasCallStack, MonadLogger m) => LogSource -> Message -> m () #

See logDebugNS

Since: monad-logger-aeson-0.1.0.0

logErrorNS :: (HasCallStack, MonadLogger m) => LogSource -> Message -> m () #

See logDebugNS

Since: monad-logger-aeson-0.1.0.0

logOtherNS :: (HasCallStack, MonadLogger m) => LogSource -> LogLevel -> Message -> m () #

See logDebugNS

Since: monad-logger-aeson-0.1.0.0

withThreadContext :: (MonadIO m, MonadMask m) => [Pair] -> m a -> m a #

This function lets us register structured, contextual info for the duration of the provided action. All messages logged within the provided action will automatically include this contextual info. This function is thread-safe, as the contextual info is scoped to the calling thread only.

This function is additive: if we nest calls to it, each nested call will add to the existing thread context. In the case of overlapping keys, the nested call's Pair value(s) will win. Whenever the inner action completes, the thread context is rolled back to its value set in the enclosing action.

If we wish to include the existing thread context from one thread in another thread, we must register the thread context explicitly on that other thread. myThreadContext can be leveraged in this case.

Registering thread context for messages can be useful in many scenarios. One particularly apt scenario is in wai middlewares. We can generate an ID for each incoming request then include it in the thread context. Now all messages subsequently logged from our endpoint handler will automatically include that request ID:

import Control.Monad.Logger.Aeson ((.=), withThreadContext)
import Network.Wai (Middleware)
import qualified Data.UUID.V4 as UUID

addRequestId :: Middleware
addRequestId app = \request sendResponse -> do
  uuid <- UUID.nextRandom
  withThreadContext ["requestId" .= uuid] do
    app request sendResponse

If we're coming from a Java background, it may be helpful for us to draw parallels between this function and log4j2's ThreadContext (or perhaps log4j's MDC). They all enable the same thing: setting some thread-local info that will be automatically pulled into each logged message.

Since: monad-logger-aeson-0.1.0.0

myThreadContext :: (MonadIO m, MonadThrow m) => m (KeyMap Value) #

This function lets us retrieve the calling thread's thread context. For more detail, we can consult the docs for withThreadContext.

Note that even though the type signature lists MonadThrow as a required constraint, the library guarantees that myThreadContext will never throw.

Since: monad-logger-aeson-0.1.0.0

data LoggingT (m :: Type -> Type) a #

Monad transformer that adds a new logging function.

Since: monad-logger-0.2.2

Instances

Instances details
MonadTransControl LoggingT 
Instance details

Defined in Control.Monad.Logger

Associated Types

type StT LoggingT a #

Methods

liftWith :: Monad m => (Run LoggingT -> m a) -> LoggingT m a #

restoreT :: Monad m => m (StT LoggingT a) -> LoggingT m a #

MonadTrans LoggingT 
Instance details

Defined in Control.Monad.Logger

Methods

lift :: Monad m => m a -> LoggingT m a #

MonadRWS r w s m => MonadRWS r w s (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

MonadBaseControl b m => MonadBaseControl b (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

Associated Types

type StM (LoggingT m) a #

Methods

liftBaseWith :: (RunInBase (LoggingT m) b -> b a) -> LoggingT m a #

restoreM :: StM (LoggingT m) a -> LoggingT m a #

MonadError e m => MonadError e (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

throwError :: e -> LoggingT m a #

catchError :: LoggingT m a -> (e -> LoggingT m a) -> LoggingT m a #

MonadReader r m => MonadReader r (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

ask :: LoggingT m r #

local :: (r -> r) -> LoggingT m a -> LoggingT m a #

reader :: (r -> a) -> LoggingT m a #

MonadState s m => MonadState s (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

get :: LoggingT m s #

put :: s -> LoggingT m () #

state :: (s -> (a, s)) -> LoggingT m a #

MonadWriter w m => MonadWriter w (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

writer :: (a, w) -> LoggingT m a #

tell :: w -> LoggingT m () #

listen :: LoggingT m a -> LoggingT m (a, w) #

pass :: LoggingT m (a, w -> w) -> LoggingT m a #

MonadBase b m => MonadBase b (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

liftBase :: b α -> LoggingT m α #

MonadFail m => MonadFail (LoggingT m)

Since: monad-logger-0.3.30

Instance details

Defined in Control.Monad.Logger

Methods

fail :: String -> LoggingT m a #

MonadIO m => MonadIO (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

liftIO :: IO a -> LoggingT m a #

Alternative m => Alternative (LoggingT m)

Since: monad-logger-0.3.40

Instance details

Defined in Control.Monad.Logger

Methods

empty :: LoggingT m a #

(<|>) :: LoggingT m a -> LoggingT m a -> LoggingT m a #

some :: LoggingT m a -> LoggingT m [a] #

many :: LoggingT m a -> LoggingT m [a] #

Applicative m => Applicative (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

pure :: a -> LoggingT m a #

(<*>) :: LoggingT m (a -> b) -> LoggingT m a -> LoggingT m b #

liftA2 :: (a -> b -> c) -> LoggingT m a -> LoggingT m b -> LoggingT m c #

(*>) :: LoggingT m a -> LoggingT m b -> LoggingT m b #

(<*) :: LoggingT m a -> LoggingT m b -> LoggingT m a #

Functor m => Functor (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

fmap :: (a -> b) -> LoggingT m a -> LoggingT m b #

(<$) :: a -> LoggingT m b -> LoggingT m a #

Monad m => Monad (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

(>>=) :: LoggingT m a -> (a -> LoggingT m b) -> LoggingT m b #

(>>) :: LoggingT m a -> LoggingT m b -> LoggingT m b #

return :: a -> LoggingT m a #

MonadActive m => MonadActive (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

MonadCatch m => MonadCatch (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

catch :: Exception e => LoggingT m a -> (e -> LoggingT m a) -> LoggingT m a #

MonadMask m => MonadMask (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

mask :: ((forall a. LoggingT m a -> LoggingT m a) -> LoggingT m b) -> LoggingT m b #

uninterruptibleMask :: ((forall a. LoggingT m a -> LoggingT m a) -> LoggingT m b) -> LoggingT m b #

generalBracket :: LoggingT m a -> (a -> ExitCase b -> LoggingT m c) -> (a -> LoggingT m b) -> LoggingT m (b, c) #

MonadThrow m => MonadThrow (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

throwM :: Exception e => e -> LoggingT m a #

MonadIO m => MonadLogger (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> LoggingT m () #

MonadIO m => MonadLoggerIO (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

askLoggerIO :: LoggingT m (Loc -> LogSource -> LogLevel -> LogStr -> IO ()) #

MonadCont m => MonadCont (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

callCC :: ((a -> LoggingT m b) -> LoggingT m a) -> LoggingT m a #

MonadResource m => MonadResource (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

liftResourceT :: ResourceT IO a -> LoggingT m a #

MonadUnliftIO m => MonadUnliftIO (LoggingT m)

Since: monad-logger-0.3.26

Instance details

Defined in Control.Monad.Logger

Methods

withRunInIO :: ((forall a. LoggingT m a -> IO a) -> IO b) -> LoggingT m b #

(Applicative m, Monoid a) => Monoid (LoggingT m a) 
Instance details

Defined in Control.Monad.Logger

Methods

mempty :: LoggingT m a #

mappend :: LoggingT m a -> LoggingT m a -> LoggingT m a #

mconcat :: [LoggingT m a] -> LoggingT m a #

(Applicative m, Semigroup a) => Semigroup (LoggingT m a) 
Instance details

Defined in Control.Monad.Logger

Methods

(<>) :: LoggingT m a -> LoggingT m a -> LoggingT m a #

sconcat :: NonEmpty (LoggingT m a) -> LoggingT m a #

stimes :: Integral b => b -> LoggingT m a -> LoggingT m a #

type StT LoggingT a 
Instance details

Defined in Control.Monad.Logger

type StT LoggingT a = a
type StM (LoggingT m) a 
Instance details

Defined in Control.Monad.Logger

type StM (LoggingT m) a = StM m a

class (MonadLogger m, MonadIO m) => MonadLoggerIO (m :: Type -> Type) where #

An extension of MonadLogger for the common case where the logging action is a simple IO action. The advantage of using this typeclass is that the logging function itself can be extracted as a first-class value, which can make it easier to manipulate monad transformer stacks, as an example.

Since: monad-logger-0.3.10

Minimal complete definition

Nothing

Methods

askLoggerIO :: m (Loc -> LogSource -> LogLevel -> LogStr -> IO ()) #

Request the logging function itself.

Since: monad-logger-0.3.10

Instances

Instances details
MonadIO m => MonadLoggerIO (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

askLoggerIO :: LoggingT m (Loc -> LogSource -> LogLevel -> LogStr -> IO ()) #

MonadIO m => MonadLoggerIO (NoLoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

askLoggerIO :: NoLoggingT m (Loc -> LogSource -> LogLevel -> LogStr -> IO ()) #

MonadLoggerIO m => MonadLoggerIO (ResourceT m) 
Instance details

Defined in Control.Monad.Logger

Methods

askLoggerIO :: ResourceT m (Loc -> LogSource -> LogLevel -> LogStr -> IO ()) #

MonadLoggerIO m => MonadLoggerIO (ListT m) 
Instance details

Defined in Control.Monad.Logger

Methods

askLoggerIO :: ListT m (Loc -> LogSource -> LogLevel -> LogStr -> IO ()) #

MonadLoggerIO m => MonadLoggerIO (MaybeT m) 
Instance details

Defined in Control.Monad.Logger

Methods

askLoggerIO :: MaybeT m (Loc -> LogSource -> LogLevel -> LogStr -> IO ()) #

(MonadLoggerIO m, Error e) => MonadLoggerIO (ErrorT e m) 
Instance details

Defined in Control.Monad.Logger

Methods

askLoggerIO :: ErrorT e m (Loc -> LogSource -> LogLevel -> LogStr -> IO ()) #

MonadLoggerIO m => MonadLoggerIO (ExceptT e m) 
Instance details

Defined in Control.Monad.Logger

Methods

askLoggerIO :: ExceptT e m (Loc -> LogSource -> LogLevel -> LogStr -> IO ()) #

MonadLoggerIO m => MonadLoggerIO (IdentityT m) 
Instance details

Defined in Control.Monad.Logger

Methods

askLoggerIO :: IdentityT m (Loc -> LogSource -> LogLevel -> LogStr -> IO ()) #

MonadLoggerIO m => MonadLoggerIO (ReaderT r m) 
Instance details

Defined in Control.Monad.Logger

Methods

askLoggerIO :: ReaderT r m (Loc -> LogSource -> LogLevel -> LogStr -> IO ()) #

MonadLoggerIO m => MonadLoggerIO (StateT s m) 
Instance details

Defined in Control.Monad.Logger

Methods

askLoggerIO :: StateT s m (Loc -> LogSource -> LogLevel -> LogStr -> IO ()) #

MonadLoggerIO m => MonadLoggerIO (StateT s m) 
Instance details

Defined in Control.Monad.Logger

Methods

askLoggerIO :: StateT s m (Loc -> LogSource -> LogLevel -> LogStr -> IO ()) #

(MonadLoggerIO m, Monoid w) => MonadLoggerIO (WriterT w m) 
Instance details

Defined in Control.Monad.Logger

Methods

askLoggerIO :: WriterT w m (Loc -> LogSource -> LogLevel -> LogStr -> IO ()) #

(MonadLoggerIO m, Monoid w) => MonadLoggerIO (WriterT w m) 
Instance details

Defined in Control.Monad.Logger

Methods

askLoggerIO :: WriterT w m (Loc -> LogSource -> LogLevel -> LogStr -> IO ()) #

MonadLoggerIO m => MonadLoggerIO (ConduitM i o m) 
Instance details

Defined in Control.Monad.Logger

Methods

askLoggerIO :: ConduitM i o m (Loc -> LogSource -> LogLevel -> LogStr -> IO ()) #

MonadLoggerIO m => MonadLoggerIO (ContT r m) 
Instance details

Defined in Control.Monad.Logger

Methods

askLoggerIO :: ContT r m (Loc -> LogSource -> LogLevel -> LogStr -> IO ()) #

(MonadLoggerIO m, Monoid w) => MonadLoggerIO (RWST r w s m) 
Instance details

Defined in Control.Monad.Logger

Methods

askLoggerIO :: RWST r w s m (Loc -> LogSource -> LogLevel -> LogStr -> IO ()) #

(MonadLoggerIO m, Monoid w) => MonadLoggerIO (RWST r w s m) 
Instance details

Defined in Control.Monad.Logger

Methods

askLoggerIO :: RWST r w s m (Loc -> LogSource -> LogLevel -> LogStr -> IO ()) #

MonadLoggerIO m => MonadLoggerIO (Pipe l i o u m) 
Instance details

Defined in Control.Monad.Logger

Methods

askLoggerIO :: Pipe l i o u m (Loc -> LogSource -> LogLevel -> LogStr -> IO ()) #

class Monad m => MonadLogger (m :: Type -> Type) where #

A Monad which has the ability to log messages in some manner.

Minimal complete definition

Nothing

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> m () #

Instances

Instances details
MonadIO m => MonadLogger (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> LoggingT m () #

Monad m => MonadLogger (NoLoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> NoLoggingT m () #

Monad m => MonadLogger (WriterLoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> WriterLoggingT m () #

MonadLogger m => MonadLogger (ResourceT m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> ResourceT m () #

MonadLogger m => MonadLogger (ListT m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> ListT m () #

MonadLogger m => MonadLogger (MaybeT m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> MaybeT m () #

MonadIO m => MonadLogger (AppT app m) Source # 
Instance details

Defined in Stackctl.CLI

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> AppT app m () #

(MonadLogger m, Error e) => MonadLogger (ErrorT e m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> ErrorT e m () #

MonadLogger m => MonadLogger (ExceptT e m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> ExceptT e m () #

MonadLogger m => MonadLogger (IdentityT m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> IdentityT m () #

MonadLogger m => MonadLogger (ReaderT r m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> ReaderT r m () #

MonadLogger m => MonadLogger (StateT s m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> StateT s m () #

MonadLogger m => MonadLogger (StateT s m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> StateT s m () #

(MonadLogger m, Monoid w) => MonadLogger (WriterT w m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> WriterT w m () #

(MonadLogger m, Monoid w) => MonadLogger (WriterT w m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> WriterT w m () #

MonadLogger m => MonadLogger (ConduitM i o m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> ConduitM i o m () #

MonadLogger m => MonadLogger (ContT r m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> ContT r m () #

(MonadLogger m, Monoid w) => MonadLogger (RWST r w s m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> RWST r w s m () #

(MonadLogger m, Monoid w) => MonadLogger (RWST r w s m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> RWST r w s m () #

MonadLogger m => MonadLogger (Pipe l i o u m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> Pipe l i o u m () #

data LogLevel #

Instances

Instances details
Read LogLevel 
Instance details

Defined in Control.Monad.Logger

Show LogLevel 
Instance details

Defined in Control.Monad.Logger

Eq LogLevel 
Instance details

Defined in Control.Monad.Logger

Ord LogLevel 
Instance details

Defined in Control.Monad.Logger

Lift LogLevel 
Instance details

Defined in Control.Monad.Logger

Methods

lift :: Quote m => LogLevel -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => LogLevel -> Code m LogLevel #

class MonadCatch m => MonadMask (m :: Type -> Type) #

A class for monads which provide for the ability to account for all possible exit points from a computation, and to mask asynchronous exceptions. Continuation-based monads are invalid instances of this class.

Instances should ensure that, in the following code:

fg = f `finally` g

The action g is called regardless of what occurs within f, including async exceptions. Some monads allow f to abort the computation via other effects than throwing an exception. For simplicity, we will consider aborting and throwing an exception to be two forms of "throwing an error".

If f and g both throw an error, the error thrown by fg depends on which errors we're talking about. In a monad transformer stack, the deeper layers override the effects of the inner layers; for example, ExceptT e1 (Except e2) a represents a value of type Either e2 (Either e1 a), so throwing both an e1 and an e2 will result in Left e2. If f and g both throw an error from the same layer, instances should ensure that the error from g wins.

Effects other than throwing an error are also overriden by the deeper layers. For example, StateT s Maybe a represents a value of type s -> Maybe (a, s), so if an error thrown from f causes this function to return Nothing, any changes to the state which f also performed will be erased. As a result, g will see the state as it was before f. Once g completes, f's error will be rethrown, so g' state changes will be erased as well. This is the normal interaction between effects in a monad transformer stack.

By contrast, lifted-base's version of finally always discards all of g's non-IO effects, and g never sees any of f's non-IO effects, regardless of the layer ordering and regardless of whether f throws an error. This is not the result of interacting effects, but a consequence of MonadBaseControl's approach.

Minimal complete definition

mask, uninterruptibleMask, generalBracket

Instances

Instances details
MonadMask IO 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. IO a -> IO a) -> IO b) -> IO b #

uninterruptibleMask :: ((forall a. IO a -> IO a) -> IO b) -> IO b #

generalBracket :: IO a -> (a -> ExitCase b -> IO c) -> (a -> IO b) -> IO (b, c) #

e ~ SomeException => MonadMask (Either e)

Since: exceptions-0.8.3

Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. Either e a -> Either e a) -> Either e b) -> Either e b #

uninterruptibleMask :: ((forall a. Either e a -> Either e a) -> Either e b) -> Either e b #

generalBracket :: Either e a -> (a -> ExitCase b -> Either e c) -> (a -> Either e b) -> Either e (b, c) #

MonadMask m => MonadMask (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

mask :: ((forall a. LoggingT m a -> LoggingT m a) -> LoggingT m b) -> LoggingT m b #

uninterruptibleMask :: ((forall a. LoggingT m a -> LoggingT m a) -> LoggingT m b) -> LoggingT m b #

generalBracket :: LoggingT m a -> (a -> ExitCase b -> LoggingT m c) -> (a -> LoggingT m b) -> LoggingT m (b, c) #

MonadMask m => MonadMask (NoLoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

mask :: ((forall a. NoLoggingT m a -> NoLoggingT m a) -> NoLoggingT m b) -> NoLoggingT m b #

uninterruptibleMask :: ((forall a. NoLoggingT m a -> NoLoggingT m a) -> NoLoggingT m b) -> NoLoggingT m b #

generalBracket :: NoLoggingT m a -> (a -> ExitCase b -> NoLoggingT m c) -> (a -> NoLoggingT m b) -> NoLoggingT m (b, c) #

MonadMask m => MonadMask (WriterLoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

mask :: ((forall a. WriterLoggingT m a -> WriterLoggingT m a) -> WriterLoggingT m b) -> WriterLoggingT m b #

uninterruptibleMask :: ((forall a. WriterLoggingT m a -> WriterLoggingT m a) -> WriterLoggingT m b) -> WriterLoggingT m b #

generalBracket :: WriterLoggingT m a -> (a -> ExitCase b -> WriterLoggingT m c) -> (a -> WriterLoggingT m b) -> WriterLoggingT m (b, c) #

MonadMask m => MonadMask (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

mask :: ((forall a. ResourceT m a -> ResourceT m a) -> ResourceT m b) -> ResourceT m b #

uninterruptibleMask :: ((forall a. ResourceT m a -> ResourceT m a) -> ResourceT m b) -> ResourceT m b #

generalBracket :: ResourceT m a -> (a -> ExitCase b -> ResourceT m c) -> (a -> ResourceT m b) -> ResourceT m (b, c) #

MonadMask m => MonadMask (MaybeT m)

Since: exceptions-0.10.0

Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. MaybeT m a -> MaybeT m a) -> MaybeT m b) -> MaybeT m b #

uninterruptibleMask :: ((forall a. MaybeT m a -> MaybeT m a) -> MaybeT m b) -> MaybeT m b #

generalBracket :: MaybeT m a -> (a -> ExitCase b -> MaybeT m c) -> (a -> MaybeT m b) -> MaybeT m (b, c) #

MonadMask m => MonadMask (AppT app m) Source # 
Instance details

Defined in Stackctl.CLI

Methods

mask :: ((forall a. AppT app m a -> AppT app m a) -> AppT app m b) -> AppT app m b #

uninterruptibleMask :: ((forall a. AppT app m a -> AppT app m a) -> AppT app m b) -> AppT app m b #

generalBracket :: AppT app m a -> (a -> ExitCase b -> AppT app m c) -> (a -> AppT app m b) -> AppT app m (b, c) #

(Error e, MonadMask m) => MonadMask (ErrorT e m) 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. ErrorT e m a -> ErrorT e m a) -> ErrorT e m b) -> ErrorT e m b #

uninterruptibleMask :: ((forall a. ErrorT e m a -> ErrorT e m a) -> ErrorT e m b) -> ErrorT e m b #

generalBracket :: ErrorT e m a -> (a -> ExitCase b -> ErrorT e m c) -> (a -> ErrorT e m b) -> ErrorT e m (b, c) #

MonadMask m => MonadMask (ExceptT e m)

Since: exceptions-0.9.0

Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. ExceptT e m a -> ExceptT e m a) -> ExceptT e m b) -> ExceptT e m b #

uninterruptibleMask :: ((forall a. ExceptT e m a -> ExceptT e m a) -> ExceptT e m b) -> ExceptT e m b #

generalBracket :: ExceptT e m a -> (a -> ExitCase b -> ExceptT e m c) -> (a -> ExceptT e m b) -> ExceptT e m (b, c) #

MonadMask m => MonadMask (IdentityT m) 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. IdentityT m a -> IdentityT m a) -> IdentityT m b) -> IdentityT m b #

uninterruptibleMask :: ((forall a. IdentityT m a -> IdentityT m a) -> IdentityT m b) -> IdentityT m b #

generalBracket :: IdentityT m a -> (a -> ExitCase b -> IdentityT m c) -> (a -> IdentityT m b) -> IdentityT m (b, c) #

MonadMask m => MonadMask (ReaderT r m) 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. ReaderT r m a -> ReaderT r m a) -> ReaderT r m b) -> ReaderT r m b #

uninterruptibleMask :: ((forall a. ReaderT r m a -> ReaderT r m a) -> ReaderT r m b) -> ReaderT r m b #

generalBracket :: ReaderT r m a -> (a -> ExitCase b -> ReaderT r m c) -> (a -> ReaderT r m b) -> ReaderT r m (b, c) #

MonadMask m => MonadMask (StateT s m) 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. StateT s m a -> StateT s m a) -> StateT s m b) -> StateT s m b #

uninterruptibleMask :: ((forall a. StateT s m a -> StateT s m a) -> StateT s m b) -> StateT s m b #

generalBracket :: StateT s m a -> (a -> ExitCase b -> StateT s m c) -> (a -> StateT s m b) -> StateT s m (b, c) #

MonadMask m => MonadMask (StateT s m) 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. StateT s m a -> StateT s m a) -> StateT s m b) -> StateT s m b #

uninterruptibleMask :: ((forall a. StateT s m a -> StateT s m a) -> StateT s m b) -> StateT s m b #

generalBracket :: StateT s m a -> (a -> ExitCase b -> StateT s m c) -> (a -> StateT s m b) -> StateT s m (b, c) #

(MonadMask m, Monoid w) => MonadMask (WriterT w m) 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. WriterT w m a -> WriterT w m a) -> WriterT w m b) -> WriterT w m b #

uninterruptibleMask :: ((forall a. WriterT w m a -> WriterT w m a) -> WriterT w m b) -> WriterT w m b #

generalBracket :: WriterT w m a -> (a -> ExitCase b -> WriterT w m c) -> (a -> WriterT w m b) -> WriterT w m (b, c) #

(MonadMask m, Monoid w) => MonadMask (WriterT w m) 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. WriterT w m a -> WriterT w m a) -> WriterT w m b) -> WriterT w m b #

uninterruptibleMask :: ((forall a. WriterT w m a -> WriterT w m a) -> WriterT w m b) -> WriterT w m b #

generalBracket :: WriterT w m a -> (a -> ExitCase b -> WriterT w m c) -> (a -> WriterT w m b) -> WriterT w m (b, c) #

(MonadMask m, Monoid w) => MonadMask (RWST r w s m) 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. RWST r w s m a -> RWST r w s m a) -> RWST r w s m b) -> RWST r w s m b #

uninterruptibleMask :: ((forall a. RWST r w s m a -> RWST r w s m a) -> RWST r w s m b) -> RWST r w s m b #

generalBracket :: RWST r w s m a -> (a -> ExitCase b -> RWST r w s m c) -> (a -> RWST r w s m b) -> RWST r w s m (b, c) #

(MonadMask m, Monoid w) => MonadMask (RWST r w s m) 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. RWST r w s m a -> RWST r w s m a) -> RWST r w s m b) -> RWST r w s m b #

uninterruptibleMask :: ((forall a. RWST r w s m a -> RWST r w s m a) -> RWST r w s m b) -> RWST r w s m b #

generalBracket :: RWST r w s m a -> (a -> ExitCase b -> RWST r w s m c) -> (a -> RWST r w s m b) -> RWST r w s m (b, c) #

type Pair = (Key, Value) #

A key/value pair for an Object.

data Series #

A series of values that, when encoded, should be separated by commas. Since 0.11.0.0, the .= operator is overloaded to create either (Text, Value) or Series. You can use Series when encoding directly to a bytestring builder as in the following example:

toEncoding (Person name age) = pairs ("name" .= name <> "age" .= age)

Instances

Instances details
KeyValue Series 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

(.=) :: ToJSON v => Key -> v -> Series #

Monoid Series 
Instance details

Defined in Data.Aeson.Encoding.Internal

Semigroup Series 
Instance details

Defined in Data.Aeson.Encoding.Internal

e ~ Encoding => KeyValuePair e Series 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

pair :: Key -> e -> Series

a ~ Value => FromPairs (Encoding' a) Series 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

fromPairs :: Series -> Encoding' a

type FilePath = String #

File and directory names are values of type String, whose precise meaning is operating system dependent. Files can be opened, yielding a handle which can then be used to operate on the contents of that file.

span :: (a -> Bool) -> [a] -> ([a], [a]) #

span, applied to a predicate p and a list xs, returns a tuple where first element is longest prefix (possibly empty) of xs of elements that satisfy p and second element is the remainder of the list:

>>> span (< 3) [1,2,3,4,1,2,3,4]
([1,2],[3,4,1,2,3,4])
>>> span (< 9) [1,2,3]
([1,2,3],[])
>>> span (< 0) [1,2,3]
([],[1,2,3])

span p xs is equivalent to (takeWhile p xs, dropWhile p xs)

error :: forall (r :: RuntimeRep) (a :: TYPE r). HasCallStack => [Char] -> a #

error stops execution and displays an error message.

data ST s a #

The strict ST monad. The ST monad allows for destructive updates, but is escapable (unlike IO). A computation of type ST s a returns a value of type a, and execute in "thread" s. The s parameter is either

  • an uninstantiated type variable (inside invocations of runST), or
  • RealWorld (inside invocations of stToIO).

It serves to keep the internal states of different invocations of runST separate from each other and from invocations of stToIO.

The >>= and >> operations are strict in the state (though not in values stored in the state). For example,

runST (writeSTRef _|_ v >>= f) = _|_

Instances

Instances details
MonadFail (ST s)

Since: base-4.11.0.0

Instance details

Defined in GHC.ST

Methods

fail :: String -> ST s a #

MonadFix (ST s)

Since: base-2.1

Instance details

Defined in Control.Monad.Fix

Methods

mfix :: (a -> ST s a) -> ST s a #

Applicative (ST s)

Since: base-4.4.0.0

Instance details

Defined in GHC.ST

Methods

pure :: a -> ST s a #

(<*>) :: ST s (a -> b) -> ST s a -> ST s b #

liftA2 :: (a -> b -> c) -> ST s a -> ST s b -> ST s c #

(*>) :: ST s a -> ST s b -> ST s b #

(<*) :: ST s a -> ST s b -> ST s a #

Functor (ST s)

Since: base-2.1

Instance details

Defined in GHC.ST

Methods

fmap :: (a -> b) -> ST s a -> ST s b #

(<$) :: a -> ST s b -> ST s a #

Monad (ST s)

Since: base-2.1

Instance details

Defined in GHC.ST

Methods

(>>=) :: ST s a -> (a -> ST s b) -> ST s b #

(>>) :: ST s a -> ST s b -> ST s b #

return :: a -> ST s a #

PrimMonad (ST s) 
Instance details

Defined in Basement.Monad

Associated Types

type PrimState (ST s) #

type PrimVar (ST s) :: Type -> Type #

Methods

primitive :: (State# (PrimState (ST s)) -> (# State# (PrimState (ST s)), a #)) -> ST s a #

primThrow :: Exception e => e -> ST s a #

unPrimMonad :: ST s a -> State# (PrimState (ST s)) -> (# State# (PrimState (ST s)), a #) #

primVarNew :: a -> ST s (PrimVar (ST s) a) #

primVarRead :: PrimVar (ST s) a -> ST s a #

primVarWrite :: PrimVar (ST s) a -> a -> ST s () #

MonadThrow (ST s) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> ST s a #

PrimBase (ST s) 
Instance details

Defined in Control.Monad.Primitive

Methods

internal :: ST s a -> State# (PrimState (ST s)) -> (# State# (PrimState (ST s)), a #) #

PrimMonad (ST s) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (ST s) #

Methods

primitive :: (State# (PrimState (ST s)) -> (# State# (PrimState (ST s)), a #)) -> ST s a #

MonadBaseControl (ST s) (ST s) 
Instance details

Defined in Control.Monad.Trans.Control

Associated Types

type StM (ST s) a #

Methods

liftBaseWith :: (RunInBase (ST s) (ST s) -> ST s a) -> ST s a #

restoreM :: StM (ST s) a -> ST s a #

RandomGen g => FrozenGen (STGen g) (ST s) 
Instance details

Defined in System.Random.Stateful

Associated Types

type MutableGen (STGen g) (ST s) = (g :: Type) #

Methods

freezeGen :: MutableGen (STGen g) (ST s) -> ST s (STGen g) #

thawGen :: STGen g -> ST s (MutableGen (STGen g) (ST s)) #

Monoid a => Monoid (ST s a)

Since: base-4.11.0.0

Instance details

Defined in GHC.ST

Methods

mempty :: ST s a #

mappend :: ST s a -> ST s a -> ST s a #

mconcat :: [ST s a] -> ST s a #

Semigroup a => Semigroup (ST s a)

Since: base-4.11.0.0

Instance details

Defined in GHC.ST

Methods

(<>) :: ST s a -> ST s a -> ST s a #

sconcat :: NonEmpty (ST s a) -> ST s a #

stimes :: Integral b => b -> ST s a -> ST s a #

Show (ST s a)

Since: base-2.1

Instance details

Defined in GHC.ST

Methods

showsPrec :: Int -> ST s a -> ShowS #

show :: ST s a -> String #

showList :: [ST s a] -> ShowS #

RandomGen r => RandomGenM (STGenM r s) r (ST s) 
Instance details

Defined in System.Random.Stateful

Methods

applyRandomGenM :: (r -> (a, r)) -> STGenM r s -> ST s a #

RandomGen g => StatefulGen (STGenM g s) (ST s) 
Instance details

Defined in System.Random.Stateful

type PrimState (ST s) 
Instance details

Defined in Basement.Monad

type PrimState (ST s) = s
type PrimVar (ST s) 
Instance details

Defined in Basement.Monad

type PrimVar (ST s) = STRef s
type PrimState (ST s) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ST s) = s
type StM (ST s) a 
Instance details

Defined in Control.Monad.Trans.Control

type StM (ST s) a = a
type MutableGen (STGen g) (ST s) 
Instance details

Defined in System.Random.Stateful

type MutableGen (STGen g) (ST s) = STGenM g s

liftM :: Monad m => (a1 -> r) -> m a1 -> m r #

Promote a function to a monad.

id :: a -> a #

Identity function.

id x = x

either :: (a -> c) -> (b -> c) -> Either a b -> c #

Case analysis for the Either type. If the value is Left a, apply the first function to a; if it is Right b, apply the second function to b.

Examples

Expand

We create two values of type Either String Int, one using the Left constructor and another using the Right constructor. Then we apply "either" the length function (if we have a String) or the "times-two" function (if we have an Int):

>>> let s = Left "foo" :: Either String Int
>>> let n = Right 3 :: Either String Int
>>> either length (*2) s
3
>>> either length (*2) n
6

class Monad m => MonadReader r (m :: Type -> Type) | m -> r where #

See examples in Control.Monad.Reader. Note, the partially applied function type (->) r is a simple reader monad. See the instance declaration below.

Minimal complete definition

(ask | reader), local

Methods

ask :: m r #

Retrieves the monad environment.

local #

Arguments

:: (r -> r)

The function to modify the environment.

-> m a

Reader to run in the modified environment.

-> m a 

Executes a computation in a modified environment.

Instances

Instances details
(Representable f, Rep f ~ a) => MonadReader a (Co f) 
Instance details

Defined in Data.Functor.Rep

Methods

ask :: Co f a #

local :: (a -> a) -> Co f a0 -> Co f a0 #

reader :: (a -> a0) -> Co f a0 #

MonadReader e m => MonadReader e (Free m) 
Instance details

Defined in Control.Monad.Free

Methods

ask :: Free m e #

local :: (e -> e) -> Free m a -> Free m a #

reader :: (e -> a) -> Free m a #

MonadReader env (RIO env) 
Instance details

Defined in RIO.Prelude.RIO

Methods

ask :: RIO env env #

local :: (env -> env) -> RIO env a -> RIO env a #

reader :: (env -> a) -> RIO env a #

MonadReader r m => MonadReader r (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

ask :: LoggingT m r #

local :: (r -> r) -> LoggingT m a -> LoggingT m a #

reader :: (r -> a) -> LoggingT m a #

MonadReader r m => MonadReader r (NoLoggingT m)

Since: monad-logger-0.3.24

Instance details

Defined in Control.Monad.Logger

Methods

ask :: NoLoggingT m r #

local :: (r -> r) -> NoLoggingT m a -> NoLoggingT m a #

reader :: (r -> a) -> NoLoggingT m a #

MonadReader r m => MonadReader r (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

ask :: ResourceT m r #

local :: (r -> r) -> ResourceT m a -> ResourceT m a #

reader :: (r -> a) -> ResourceT m a #

MonadReader r m => MonadReader r (ListT m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: ListT m r #

local :: (r -> r) -> ListT m a -> ListT m a #

reader :: (r -> a) -> ListT m a #

MonadReader r m => MonadReader r (MaybeT m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: MaybeT m r #

local :: (r -> r) -> MaybeT m a -> MaybeT m a #

reader :: (r -> a) -> MaybeT m a #

MonadReader s (ReifiedFold s) 
Instance details

Defined in Control.Lens.Reified

Methods

ask :: ReifiedFold s s #

local :: (s -> s) -> ReifiedFold s a -> ReifiedFold s a #

reader :: (s -> a) -> ReifiedFold s a #

MonadReader s (ReifiedGetter s) 
Instance details

Defined in Control.Lens.Reified

Methods

ask :: ReifiedGetter s s #

local :: (s -> s) -> ReifiedGetter s a -> ReifiedGetter s a #

reader :: (s -> a) -> ReifiedGetter s a #

Monad m => MonadReader app (AppT app m) Source # 
Instance details

Defined in Stackctl.CLI

Methods

ask :: AppT app m app #

local :: (app -> app) -> AppT app m a -> AppT app m a #

reader :: (app -> a) -> AppT app m a #

(Functor f, MonadReader r m) => MonadReader r (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

ask :: FreeT f m r #

local :: (r -> r) -> FreeT f m a -> FreeT f m a #

reader :: (r -> a) -> FreeT f m a #

(Error e, MonadReader r m) => MonadReader r (ErrorT e m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: ErrorT e m r #

local :: (r -> r) -> ErrorT e m a -> ErrorT e m a #

reader :: (r -> a) -> ErrorT e m a #

MonadReader r m => MonadReader r (ExceptT e m)

Since: mtl-2.2

Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: ExceptT e m r #

local :: (r -> r) -> ExceptT e m a -> ExceptT e m a #

reader :: (r -> a) -> ExceptT e m a #

MonadReader r m => MonadReader r (IdentityT m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: IdentityT m r #

local :: (r -> r) -> IdentityT m a -> IdentityT m a #

reader :: (r -> a) -> IdentityT m a #

Monad m => MonadReader r (ReaderT r m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: ReaderT r m r #

local :: (r -> r) -> ReaderT r m a -> ReaderT r m a #

reader :: (r -> a) -> ReaderT r m a #

MonadReader r m => MonadReader r (StateT s m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: StateT s m r #

local :: (r -> r) -> StateT s m a -> StateT s m a #

reader :: (r -> a) -> StateT s m a #

MonadReader r m => MonadReader r (StateT s m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: StateT s m r #

local :: (r -> r) -> StateT s m a -> StateT s m a #

reader :: (r -> a) -> StateT s m a #

(Monoid w, MonadReader r m) => MonadReader r (WriterT w m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: WriterT w m r #

local :: (r -> r) -> WriterT w m a -> WriterT w m a #

reader :: (r -> a) -> WriterT w m a #

(Monoid w, MonadReader r m) => MonadReader r (WriterT w m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: WriterT w m r #

local :: (r -> r) -> WriterT w m a -> WriterT w m a #

reader :: (r -> a) -> WriterT w m a #

MonadReader r m => MonadReader r (ConduitT i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

ask :: ConduitT i o m r #

local :: (r -> r) -> ConduitT i o m a -> ConduitT i o m a #

reader :: (r -> a) -> ConduitT i o m a #

MonadReader r ((->) r) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: r -> r #

local :: (r -> r) -> (r -> a) -> r -> a #

reader :: (r -> a) -> r -> a #

MonadReader r' m => MonadReader r' (ContT r m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: ContT r m r' #

local :: (r' -> r') -> ContT r m a -> ContT r m a #

reader :: (r' -> a) -> ContT r m a #

(Monad m, Monoid w) => MonadReader r (RWST r w s m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: RWST r w s m r #

local :: (r -> r) -> RWST r w s m a -> RWST r w s m a #

reader :: (r -> a) -> RWST r w s m a #

(Monad m, Monoid w) => MonadReader r (RWST r w s m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: RWST r w s m r #

local :: (r -> r) -> RWST r w s m a -> RWST r w s m a #

reader :: (r -> a) -> RWST r w s m a #

MonadReader r m => MonadReader r (Pipe l i o u m) 
Instance details

Defined in Data.Conduit.Internal.Pipe

Methods

ask :: Pipe l i o u m r #

local :: (r -> r) -> Pipe l i o u m a -> Pipe l i o u m a #

reader :: (r -> a) -> Pipe l i o u m a #

data Builder #

Builders denote sequences of bytes. They are Monoids where mempty is the zero-length sequence and mappend is concatenation, which runs in O(1).

Instances

Instances details
ToLog ByteStringBuilder 
Instance details

Defined in Amazonka.Data.Log

Monoid Builder 
Instance details

Defined in Data.ByteString.Builder.Internal

Semigroup Builder 
Instance details

Defined in Data.ByteString.Builder.Internal

ToLogStr Builder 
Instance details

Defined in System.Log.FastLogger.LogStr

Methods

toLogStr :: Builder -> LogStr #

class Eq a => Hashable a #

The class of types that can be converted to a hash value.

Minimal implementation: hashWithSalt.

Note: the hash is not guaranteed to be stable across library versions, operating systems or architectures. For stable hashing use named hashes: SHA256, CRC32 etc.

If you are looking for Hashable instance in time package, check time-compat

Instances

Instances details
Hashable Key 
Instance details

Defined in Data.Aeson.Key

Methods

hashWithSalt :: Int -> Key -> Int #

hash :: Key -> Int #

Hashable Value 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

hashWithSalt :: Int -> Value -> Int #

hash :: Value -> Int #

Hashable ActivateType 
Instance details

Defined in Amazonka.CloudFormation.ActivateType

Hashable BatchDescribeTypeConfigurations 
Instance details

Defined in Amazonka.CloudFormation.BatchDescribeTypeConfigurations

Hashable CancelUpdateStack 
Instance details

Defined in Amazonka.CloudFormation.CancelUpdateStack

Hashable ContinueUpdateRollback 
Instance details

Defined in Amazonka.CloudFormation.ContinueUpdateRollback

Hashable CreateChangeSet 
Instance details

Defined in Amazonka.CloudFormation.CreateChangeSet

Hashable CreateStack 
Instance details

Defined in Amazonka.CloudFormation.CreateStack

Hashable CreateStackInstances 
Instance details

Defined in Amazonka.CloudFormation.CreateStackInstances

Hashable CreateStackSet 
Instance details

Defined in Amazonka.CloudFormation.CreateStackSet

Hashable DeactivateType 
Instance details

Defined in Amazonka.CloudFormation.DeactivateType

Hashable DeleteChangeSet 
Instance details

Defined in Amazonka.CloudFormation.DeleteChangeSet

Hashable DeleteStack 
Instance details

Defined in Amazonka.CloudFormation.DeleteStack

Hashable DeleteStackInstances 
Instance details

Defined in Amazonka.CloudFormation.DeleteStackInstances

Hashable DeleteStackSet 
Instance details

Defined in Amazonka.CloudFormation.DeleteStackSet

Hashable DeregisterType 
Instance details

Defined in Amazonka.CloudFormation.DeregisterType

Hashable DescribeAccountLimits 
Instance details

Defined in Amazonka.CloudFormation.DescribeAccountLimits

Hashable DescribeChangeSet 
Instance details

Defined in Amazonka.CloudFormation.DescribeChangeSet

Hashable DescribeChangeSetHooks 
Instance details

Defined in Amazonka.CloudFormation.DescribeChangeSetHooks

Hashable DescribePublisher 
Instance details

Defined in Amazonka.CloudFormation.DescribePublisher

Hashable DescribeStackDriftDetectionStatus 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackDriftDetectionStatus

Hashable DescribeStackEvents 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackEvents

Hashable DescribeStackInstance 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackInstance

Hashable DescribeStackResource 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackResource

Hashable DescribeStackResourceDrifts 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackResourceDrifts

Hashable DescribeStackResources 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackResources

Hashable DescribeStackSet 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackSet

Hashable DescribeStackSetOperation 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackSetOperation

Hashable DescribeStacks 
Instance details

Defined in Amazonka.CloudFormation.DescribeStacks

Hashable DescribeType 
Instance details

Defined in Amazonka.CloudFormation.DescribeType

Hashable DescribeTypeRegistration 
Instance details

Defined in Amazonka.CloudFormation.DescribeTypeRegistration

Hashable DetectStackDrift 
Instance details

Defined in Amazonka.CloudFormation.DetectStackDrift

Hashable DetectStackResourceDrift 
Instance details

Defined in Amazonka.CloudFormation.DetectStackResourceDrift

Hashable DetectStackSetDrift 
Instance details

Defined in Amazonka.CloudFormation.DetectStackSetDrift

Hashable EstimateTemplateCost 
Instance details

Defined in Amazonka.CloudFormation.EstimateTemplateCost

Hashable ExecuteChangeSet 
Instance details

Defined in Amazonka.CloudFormation.ExecuteChangeSet

Hashable GetStackPolicy 
Instance details

Defined in Amazonka.CloudFormation.GetStackPolicy

Hashable GetTemplate 
Instance details

Defined in Amazonka.CloudFormation.GetTemplate

Hashable GetTemplateSummary 
Instance details

Defined in Amazonka.CloudFormation.GetTemplateSummary

Hashable ImportStacksToStackSet 
Instance details

Defined in Amazonka.CloudFormation.ImportStacksToStackSet

Hashable ListChangeSets 
Instance details

Defined in Amazonka.CloudFormation.ListChangeSets

Hashable ListExports 
Instance details

Defined in Amazonka.CloudFormation.ListExports

Hashable ListImports 
Instance details

Defined in Amazonka.CloudFormation.ListImports

Hashable ListStackInstances 
Instance details

Defined in Amazonka.CloudFormation.ListStackInstances

Hashable ListStackResources 
Instance details

Defined in Amazonka.CloudFormation.ListStackResources

Hashable ListStackSetOperationResults 
Instance details

Defined in Amazonka.CloudFormation.ListStackSetOperationResults

Hashable ListStackSetOperations 
Instance details

Defined in Amazonka.CloudFormation.ListStackSetOperations

Hashable ListStackSets 
Instance details

Defined in Amazonka.CloudFormation.ListStackSets

Hashable ListStacks 
Instance details

Defined in Amazonka.CloudFormation.ListStacks

Hashable ListTypeRegistrations 
Instance details

Defined in Amazonka.CloudFormation.ListTypeRegistrations

Hashable ListTypeVersions 
Instance details

Defined in Amazonka.CloudFormation.ListTypeVersions

Hashable ListTypes 
Instance details

Defined in Amazonka.CloudFormation.ListTypes

Hashable PublishType 
Instance details

Defined in Amazonka.CloudFormation.PublishType

Hashable RecordHandlerProgress 
Instance details

Defined in Amazonka.CloudFormation.RecordHandlerProgress

Hashable RegisterPublisher 
Instance details

Defined in Amazonka.CloudFormation.RegisterPublisher

Hashable RegisterType 
Instance details

Defined in Amazonka.CloudFormation.RegisterType

Hashable RollbackStack 
Instance details

Defined in Amazonka.CloudFormation.RollbackStack

Hashable SetStackPolicy 
Instance details

Defined in Amazonka.CloudFormation.SetStackPolicy

Hashable SetTypeConfiguration 
Instance details

Defined in Amazonka.CloudFormation.SetTypeConfiguration

Hashable SetTypeDefaultVersion 
Instance details

Defined in Amazonka.CloudFormation.SetTypeDefaultVersion

Hashable SignalResource 
Instance details

Defined in Amazonka.CloudFormation.SignalResource

Hashable StopStackSetOperation 
Instance details

Defined in Amazonka.CloudFormation.StopStackSetOperation

Hashable TestType 
Instance details

Defined in Amazonka.CloudFormation.TestType

Methods

hashWithSalt :: Int -> TestType -> Int #

hash :: TestType -> Int #

Hashable AccountFilterType 
Instance details

Defined in Amazonka.CloudFormation.Types.AccountFilterType

Hashable AccountGateResult 
Instance details

Defined in Amazonka.CloudFormation.Types.AccountGateResult

Hashable AccountGateStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.AccountGateStatus

Hashable AccountLimit 
Instance details

Defined in Amazonka.CloudFormation.Types.AccountLimit

Hashable AutoDeployment 
Instance details

Defined in Amazonka.CloudFormation.Types.AutoDeployment

Hashable BatchDescribeTypeConfigurationsError 
Instance details

Defined in Amazonka.CloudFormation.Types.BatchDescribeTypeConfigurationsError

Hashable CallAs 
Instance details

Defined in Amazonka.CloudFormation.Types.CallAs

Methods

hashWithSalt :: Int -> CallAs -> Int #

hash :: CallAs -> Int #

Hashable Capability 
Instance details

Defined in Amazonka.CloudFormation.Types.Capability

Hashable Category 
Instance details

Defined in Amazonka.CloudFormation.Types.Category

Methods

hashWithSalt :: Int -> Category -> Int #

hash :: Category -> Int #

Hashable Change 
Instance details

Defined in Amazonka.CloudFormation.Types.Change

Methods

hashWithSalt :: Int -> Change -> Int #

hash :: Change -> Int #

Hashable ChangeAction 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeAction

Hashable ChangeSetHook 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetHook

Hashable ChangeSetHookResourceTargetDetails 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetHookResourceTargetDetails

Hashable ChangeSetHookTargetDetails 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetHookTargetDetails

Hashable ChangeSetHooksStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetHooksStatus

Hashable ChangeSetStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetStatus

Hashable ChangeSetSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetSummary

Hashable ChangeSetType 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetType

Hashable ChangeSource 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSource

Hashable ChangeType 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeType

Hashable DeploymentTargets 
Instance details

Defined in Amazonka.CloudFormation.Types.DeploymentTargets

Hashable DeprecatedStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.DeprecatedStatus

Hashable DifferenceType 
Instance details

Defined in Amazonka.CloudFormation.Types.DifferenceType

Hashable EvaluationType 
Instance details

Defined in Amazonka.CloudFormation.Types.EvaluationType

Hashable ExecutionStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.ExecutionStatus

Hashable Export 
Instance details

Defined in Amazonka.CloudFormation.Types.Export

Methods

hashWithSalt :: Int -> Export -> Int #

hash :: Export -> Int #

Hashable HandlerErrorCode 
Instance details

Defined in Amazonka.CloudFormation.Types.HandlerErrorCode

Hashable HookFailureMode 
Instance details

Defined in Amazonka.CloudFormation.Types.HookFailureMode

Hashable HookInvocationPoint 
Instance details

Defined in Amazonka.CloudFormation.Types.HookInvocationPoint

Hashable HookStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.HookStatus

Hashable HookTargetType 
Instance details

Defined in Amazonka.CloudFormation.Types.HookTargetType

Hashable IdentityProvider 
Instance details

Defined in Amazonka.CloudFormation.Types.IdentityProvider

Hashable LoggingConfig 
Instance details

Defined in Amazonka.CloudFormation.Types.LoggingConfig

Hashable ManagedExecution 
Instance details

Defined in Amazonka.CloudFormation.Types.ManagedExecution

Hashable ModuleInfo 
Instance details

Defined in Amazonka.CloudFormation.Types.ModuleInfo

Hashable OnFailure 
Instance details

Defined in Amazonka.CloudFormation.Types.OnFailure

Hashable OperationResultFilter 
Instance details

Defined in Amazonka.CloudFormation.Types.OperationResultFilter

Hashable OperationResultFilterName 
Instance details

Defined in Amazonka.CloudFormation.Types.OperationResultFilterName

Hashable OperationStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.OperationStatus

Hashable Output 
Instance details

Defined in Amazonka.CloudFormation.Types.Output

Methods

hashWithSalt :: Int -> Output -> Int #

hash :: Output -> Int #

Hashable Parameter 
Instance details

Defined in Amazonka.CloudFormation.Types.Parameter

Hashable ParameterConstraints 
Instance details

Defined in Amazonka.CloudFormation.Types.ParameterConstraints

Hashable ParameterDeclaration 
Instance details

Defined in Amazonka.CloudFormation.Types.ParameterDeclaration

Hashable PermissionModels 
Instance details

Defined in Amazonka.CloudFormation.Types.PermissionModels

Hashable PhysicalResourceIdContextKeyValuePair 
Instance details

Defined in Amazonka.CloudFormation.Types.PhysicalResourceIdContextKeyValuePair

Hashable PropertyDifference 
Instance details

Defined in Amazonka.CloudFormation.Types.PropertyDifference

Hashable ProvisioningType 
Instance details

Defined in Amazonka.CloudFormation.Types.ProvisioningType

Hashable PublisherStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.PublisherStatus

Hashable RegionConcurrencyType 
Instance details

Defined in Amazonka.CloudFormation.Types.RegionConcurrencyType

Hashable RegistrationStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.RegistrationStatus

Hashable RegistryType 
Instance details

Defined in Amazonka.CloudFormation.Types.RegistryType

Hashable Replacement 
Instance details

Defined in Amazonka.CloudFormation.Types.Replacement

Hashable RequiredActivatedType 
Instance details

Defined in Amazonka.CloudFormation.Types.RequiredActivatedType

Hashable RequiresRecreation 
Instance details

Defined in Amazonka.CloudFormation.Types.RequiresRecreation

Hashable ResourceAttribute 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceAttribute

Hashable ResourceChange 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceChange

Hashable ResourceChangeDetail 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceChangeDetail

Hashable ResourceIdentifierSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceIdentifierSummary

Hashable ResourceSignalStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceSignalStatus

Hashable ResourceStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceStatus

Hashable ResourceTargetDefinition 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceTargetDefinition

Hashable ResourceToImport 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceToImport

Hashable RollbackConfiguration 
Instance details

Defined in Amazonka.CloudFormation.Types.RollbackConfiguration

Hashable RollbackTrigger 
Instance details

Defined in Amazonka.CloudFormation.Types.RollbackTrigger

Hashable Stack 
Instance details

Defined in Amazonka.CloudFormation.Types.Stack

Methods

hashWithSalt :: Int -> Stack -> Int #

hash :: Stack -> Int #

Hashable StackDriftDetectionStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackDriftDetectionStatus

Hashable StackDriftInformation 
Instance details

Defined in Amazonka.CloudFormation.Types.StackDriftInformation

Hashable StackDriftInformationSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackDriftInformationSummary

Hashable StackDriftStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackDriftStatus

Hashable StackEvent 
Instance details

Defined in Amazonka.CloudFormation.Types.StackEvent

Hashable StackInstance 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstance

Hashable StackInstanceComprehensiveStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstanceComprehensiveStatus

Hashable StackInstanceDetailedStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstanceDetailedStatus

Hashable StackInstanceFilter 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstanceFilter

Hashable StackInstanceFilterName 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstanceFilterName

Hashable StackInstanceStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstanceStatus

Hashable StackInstanceSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstanceSummary

Hashable StackResource 
Instance details

Defined in Amazonka.CloudFormation.Types.StackResource

Hashable StackResourceDetail 
Instance details

Defined in Amazonka.CloudFormation.Types.StackResourceDetail

Hashable StackResourceDrift 
Instance details

Defined in Amazonka.CloudFormation.Types.StackResourceDrift

Hashable StackResourceDriftInformation 
Instance details

Defined in Amazonka.CloudFormation.Types.StackResourceDriftInformation

Hashable StackResourceDriftInformationSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackResourceDriftInformationSummary

Hashable StackResourceDriftStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackResourceDriftStatus

Hashable StackResourceSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackResourceSummary

Hashable StackSet 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSet

Methods

hashWithSalt :: Int -> StackSet -> Int #

hash :: StackSet -> Int #

Hashable StackSetDriftDetectionDetails 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetDriftDetectionDetails

Hashable StackSetDriftDetectionStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetDriftDetectionStatus

Hashable StackSetDriftStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetDriftStatus

Hashable StackSetOperation 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperation

Hashable StackSetOperationAction 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationAction

Hashable StackSetOperationPreferences 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationPreferences

Hashable StackSetOperationResultStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationResultStatus

Hashable StackSetOperationResultSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationResultSummary

Hashable StackSetOperationStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationStatus

Hashable StackSetOperationStatusDetails 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationStatusDetails

Hashable StackSetOperationSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationSummary

Hashable StackSetStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetStatus

Hashable StackSetSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetSummary

Hashable StackStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackStatus

Hashable StackSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSummary

Hashable Tag 
Instance details

Defined in Amazonka.CloudFormation.Types.Tag

Methods

hashWithSalt :: Int -> Tag -> Int #

hash :: Tag -> Int #

Hashable TemplateParameter 
Instance details

Defined in Amazonka.CloudFormation.Types.TemplateParameter

Hashable TemplateStage 
Instance details

Defined in Amazonka.CloudFormation.Types.TemplateStage

Hashable ThirdPartyType 
Instance details

Defined in Amazonka.CloudFormation.Types.ThirdPartyType

Hashable TypeConfigurationDetails 
Instance details

Defined in Amazonka.CloudFormation.Types.TypeConfigurationDetails

Hashable TypeConfigurationIdentifier 
Instance details

Defined in Amazonka.CloudFormation.Types.TypeConfigurationIdentifier

Hashable TypeFilters 
Instance details

Defined in Amazonka.CloudFormation.Types.TypeFilters

Hashable TypeSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.TypeSummary

Hashable TypeTestsStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.TypeTestsStatus

Hashable TypeVersionSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.TypeVersionSummary

Hashable VersionBump 
Instance details

Defined in Amazonka.CloudFormation.Types.VersionBump

Hashable Visibility 
Instance details

Defined in Amazonka.CloudFormation.Types.Visibility

Hashable UpdateStack 
Instance details

Defined in Amazonka.CloudFormation.UpdateStack

Hashable UpdateStackInstances 
Instance details

Defined in Amazonka.CloudFormation.UpdateStackInstances

Hashable UpdateStackSet 
Instance details

Defined in Amazonka.CloudFormation.UpdateStackSet

Hashable UpdateTerminationProtection 
Instance details

Defined in Amazonka.CloudFormation.UpdateTerminationProtection

Hashable ValidateTemplate 
Instance details

Defined in Amazonka.CloudFormation.ValidateTemplate

Hashable Base64 
Instance details

Defined in Amazonka.Data.Base64

Methods

hashWithSalt :: Int -> Base64 -> Int #

hash :: Base64 -> Int #

Hashable AccessKey 
Instance details

Defined in Amazonka.Types

Hashable Region 
Instance details

Defined in Amazonka.Types

Methods

hashWithSalt :: Int -> Region -> Int #

hash :: Region -> Int #

Hashable Seconds 
Instance details

Defined in Amazonka.Types

Methods

hashWithSalt :: Int -> Seconds -> Int #

hash :: Seconds -> Int #

Hashable SecretKey 
Instance details

Defined in Amazonka.Types

Hashable SessionToken 
Instance details

Defined in Amazonka.Types

Hashable DescribeAvailabilityZones 
Instance details

Defined in Amazonka.EC2.DescribeAvailabilityZones

Hashable AcceleratorCount 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorCount

Hashable AcceleratorCountRequest 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorCountRequest

Hashable AcceleratorManufacturer 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorManufacturer

Hashable AcceleratorName 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorName

Hashable AcceleratorTotalMemoryMiB 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorTotalMemoryMiB

Hashable AcceleratorTotalMemoryMiBRequest 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorTotalMemoryMiBRequest

Hashable AcceleratorType 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorType

Hashable AccessScopeAnalysisFinding 
Instance details

Defined in Amazonka.EC2.Types.AccessScopeAnalysisFinding

Hashable AccessScopePath 
Instance details

Defined in Amazonka.EC2.Types.AccessScopePath

Hashable AccessScopePathRequest 
Instance details

Defined in Amazonka.EC2.Types.AccessScopePathRequest

Hashable AccountAttribute 
Instance details

Defined in Amazonka.EC2.Types.AccountAttribute

Hashable AccountAttributeName 
Instance details

Defined in Amazonka.EC2.Types.AccountAttributeName

Hashable AccountAttributeValue 
Instance details

Defined in Amazonka.EC2.Types.AccountAttributeValue

Hashable ActiveInstance 
Instance details

Defined in Amazonka.EC2.Types.ActiveInstance

Hashable ActivityStatus 
Instance details

Defined in Amazonka.EC2.Types.ActivityStatus

Hashable AddIpamOperatingRegion 
Instance details

Defined in Amazonka.EC2.Types.AddIpamOperatingRegion

Hashable AddPrefixListEntry 
Instance details

Defined in Amazonka.EC2.Types.AddPrefixListEntry

Hashable AddedPrincipal 
Instance details

Defined in Amazonka.EC2.Types.AddedPrincipal

Hashable AdditionalDetail 
Instance details

Defined in Amazonka.EC2.Types.AdditionalDetail

Hashable Address 
Instance details

Defined in Amazonka.EC2.Types.Address

Methods

hashWithSalt :: Int -> Address -> Int #

hash :: Address -> Int #

Hashable AddressAttribute 
Instance details

Defined in Amazonka.EC2.Types.AddressAttribute

Hashable AddressAttributeName 
Instance details

Defined in Amazonka.EC2.Types.AddressAttributeName

Hashable AddressFamily 
Instance details

Defined in Amazonka.EC2.Types.AddressFamily

Hashable AddressStatus 
Instance details

Defined in Amazonka.EC2.Types.AddressStatus

Hashable AddressTransfer 
Instance details

Defined in Amazonka.EC2.Types.AddressTransfer

Hashable AddressTransferStatus 
Instance details

Defined in Amazonka.EC2.Types.AddressTransferStatus

Hashable Affinity 
Instance details

Defined in Amazonka.EC2.Types.Affinity

Methods

hashWithSalt :: Int -> Affinity -> Int #

hash :: Affinity -> Int #

Hashable AllocationState 
Instance details

Defined in Amazonka.EC2.Types.AllocationState

Hashable AllocationStrategy 
Instance details

Defined in Amazonka.EC2.Types.AllocationStrategy

Hashable AllocationType 
Instance details

Defined in Amazonka.EC2.Types.AllocationType

Hashable AllowedPrincipal 
Instance details

Defined in Amazonka.EC2.Types.AllowedPrincipal

Hashable AllowsMultipleInstanceTypes 
Instance details

Defined in Amazonka.EC2.Types.AllowsMultipleInstanceTypes

Hashable AlternatePathHint 
Instance details

Defined in Amazonka.EC2.Types.AlternatePathHint

Hashable AnalysisAclRule 
Instance details

Defined in Amazonka.EC2.Types.AnalysisAclRule

Hashable AnalysisComponent 
Instance details

Defined in Amazonka.EC2.Types.AnalysisComponent

Hashable AnalysisLoadBalancerListener 
Instance details

Defined in Amazonka.EC2.Types.AnalysisLoadBalancerListener

Hashable AnalysisLoadBalancerTarget 
Instance details

Defined in Amazonka.EC2.Types.AnalysisLoadBalancerTarget

Hashable AnalysisPacketHeader 
Instance details

Defined in Amazonka.EC2.Types.AnalysisPacketHeader

Hashable AnalysisRouteTableRoute 
Instance details

Defined in Amazonka.EC2.Types.AnalysisRouteTableRoute

Hashable AnalysisSecurityGroupRule 
Instance details

Defined in Amazonka.EC2.Types.AnalysisSecurityGroupRule

Hashable AnalysisStatus 
Instance details

Defined in Amazonka.EC2.Types.AnalysisStatus

Hashable ApplianceModeSupportValue 
Instance details

Defined in Amazonka.EC2.Types.ApplianceModeSupportValue

Hashable ArchitectureType 
Instance details

Defined in Amazonka.EC2.Types.ArchitectureType

Hashable ArchitectureValues 
Instance details

Defined in Amazonka.EC2.Types.ArchitectureValues

Hashable AssignedPrivateIpAddress 
Instance details

Defined in Amazonka.EC2.Types.AssignedPrivateIpAddress

Hashable AssociatedNetworkType 
Instance details

Defined in Amazonka.EC2.Types.AssociatedNetworkType

Hashable AssociatedRole 
Instance details

Defined in Amazonka.EC2.Types.AssociatedRole

Hashable AssociatedTargetNetwork 
Instance details

Defined in Amazonka.EC2.Types.AssociatedTargetNetwork

Hashable AssociationStatus 
Instance details

Defined in Amazonka.EC2.Types.AssociationStatus

Hashable AssociationStatusCode 
Instance details

Defined in Amazonka.EC2.Types.AssociationStatusCode

Hashable AthenaIntegration 
Instance details

Defined in Amazonka.EC2.Types.AthenaIntegration

Hashable AttachmentEnaSrdSpecification 
Instance details

Defined in Amazonka.EC2.Types.AttachmentEnaSrdSpecification

Hashable AttachmentEnaSrdUdpSpecification 
Instance details

Defined in Amazonka.EC2.Types.AttachmentEnaSrdUdpSpecification

Hashable AttachmentStatus 
Instance details

Defined in Amazonka.EC2.Types.AttachmentStatus

Hashable AttributeBooleanValue 
Instance details

Defined in Amazonka.EC2.Types.AttributeBooleanValue

Hashable AttributeValue 
Instance details

Defined in Amazonka.EC2.Types.AttributeValue

Hashable AuthorizationRule 
Instance details

Defined in Amazonka.EC2.Types.AuthorizationRule

Hashable AutoAcceptSharedAssociationsValue 
Instance details

Defined in Amazonka.EC2.Types.AutoAcceptSharedAssociationsValue

Hashable AutoAcceptSharedAttachmentsValue 
Instance details

Defined in Amazonka.EC2.Types.AutoAcceptSharedAttachmentsValue

Hashable AutoPlacement 
Instance details

Defined in Amazonka.EC2.Types.AutoPlacement

Hashable AvailabilityZone 
Instance details

Defined in Amazonka.EC2.Types.AvailabilityZone

Hashable AvailabilityZoneMessage 
Instance details

Defined in Amazonka.EC2.Types.AvailabilityZoneMessage

Hashable AvailabilityZoneOptInStatus 
Instance details

Defined in Amazonka.EC2.Types.AvailabilityZoneOptInStatus

Hashable AvailabilityZoneState 
Instance details

Defined in Amazonka.EC2.Types.AvailabilityZoneState

Hashable AvailableCapacity 
Instance details

Defined in Amazonka.EC2.Types.AvailableCapacity

Hashable BareMetal 
Instance details

Defined in Amazonka.EC2.Types.BareMetal

Hashable BaselineEbsBandwidthMbps 
Instance details

Defined in Amazonka.EC2.Types.BaselineEbsBandwidthMbps

Hashable BaselineEbsBandwidthMbpsRequest 
Instance details

Defined in Amazonka.EC2.Types.BaselineEbsBandwidthMbpsRequest

Hashable BatchState 
Instance details

Defined in Amazonka.EC2.Types.BatchState

Hashable BgpStatus 
Instance details

Defined in Amazonka.EC2.Types.BgpStatus

Hashable BlobAttributeValue 
Instance details

Defined in Amazonka.EC2.Types.BlobAttributeValue

Hashable BlockDeviceMapping 
Instance details

Defined in Amazonka.EC2.Types.BlockDeviceMapping

Hashable BootModeType 
Instance details

Defined in Amazonka.EC2.Types.BootModeType

Hashable BootModeValues 
Instance details

Defined in Amazonka.EC2.Types.BootModeValues

Hashable BundleTask 
Instance details

Defined in Amazonka.EC2.Types.BundleTask

Hashable BundleTaskError 
Instance details

Defined in Amazonka.EC2.Types.BundleTaskError

Hashable BundleTaskState 
Instance details

Defined in Amazonka.EC2.Types.BundleTaskState

Hashable BurstablePerformance 
Instance details

Defined in Amazonka.EC2.Types.BurstablePerformance

Hashable ByoipCidr 
Instance details

Defined in Amazonka.EC2.Types.ByoipCidr

Hashable ByoipCidrState 
Instance details

Defined in Amazonka.EC2.Types.ByoipCidrState

Hashable CancelBatchErrorCode 
Instance details

Defined in Amazonka.EC2.Types.CancelBatchErrorCode

Hashable CancelCapacityReservationFleetError 
Instance details

Defined in Amazonka.EC2.Types.CancelCapacityReservationFleetError

Hashable CancelSpotFleetRequestsError 
Instance details

Defined in Amazonka.EC2.Types.CancelSpotFleetRequestsError

Hashable CancelSpotFleetRequestsErrorItem 
Instance details

Defined in Amazonka.EC2.Types.CancelSpotFleetRequestsErrorItem

Hashable CancelSpotFleetRequestsSuccessItem 
Instance details

Defined in Amazonka.EC2.Types.CancelSpotFleetRequestsSuccessItem

Hashable CancelSpotInstanceRequestState 
Instance details

Defined in Amazonka.EC2.Types.CancelSpotInstanceRequestState

Hashable CancelledSpotInstanceRequest 
Instance details

Defined in Amazonka.EC2.Types.CancelledSpotInstanceRequest

Hashable CapacityAllocation 
Instance details

Defined in Amazonka.EC2.Types.CapacityAllocation

Hashable CapacityReservation 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservation

Hashable CapacityReservationFleet 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationFleet

Hashable CapacityReservationFleetCancellationState 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationFleetCancellationState

Hashable CapacityReservationFleetState 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationFleetState

Hashable CapacityReservationGroup 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationGroup

Hashable CapacityReservationInstancePlatform 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationInstancePlatform

Hashable CapacityReservationOptions 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationOptions

Hashable CapacityReservationOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationOptionsRequest

Hashable CapacityReservationPreference 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationPreference

Hashable CapacityReservationSpecification 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationSpecification

Hashable CapacityReservationSpecificationResponse 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationSpecificationResponse

Hashable CapacityReservationState 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationState

Hashable CapacityReservationTarget 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationTarget

Hashable CapacityReservationTargetResponse 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationTargetResponse

Hashable CapacityReservationTenancy 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationTenancy

Hashable CarrierGateway 
Instance details

Defined in Amazonka.EC2.Types.CarrierGateway

Hashable CarrierGatewayState 
Instance details

Defined in Amazonka.EC2.Types.CarrierGatewayState

Hashable CertificateAuthentication 
Instance details

Defined in Amazonka.EC2.Types.CertificateAuthentication

Hashable CertificateAuthenticationRequest 
Instance details

Defined in Amazonka.EC2.Types.CertificateAuthenticationRequest

Hashable CidrAuthorizationContext 
Instance details

Defined in Amazonka.EC2.Types.CidrAuthorizationContext

Hashable CidrBlock 
Instance details

Defined in Amazonka.EC2.Types.CidrBlock

Hashable ClassicLinkDnsSupport 
Instance details

Defined in Amazonka.EC2.Types.ClassicLinkDnsSupport

Hashable ClassicLinkInstance 
Instance details

Defined in Amazonka.EC2.Types.ClassicLinkInstance

Hashable ClassicLoadBalancer 
Instance details

Defined in Amazonka.EC2.Types.ClassicLoadBalancer

Hashable ClassicLoadBalancersConfig 
Instance details

Defined in Amazonka.EC2.Types.ClassicLoadBalancersConfig

Hashable ClientCertificateRevocationListStatus 
Instance details

Defined in Amazonka.EC2.Types.ClientCertificateRevocationListStatus

Hashable ClientCertificateRevocationListStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientCertificateRevocationListStatusCode

Hashable ClientConnectOptions 
Instance details

Defined in Amazonka.EC2.Types.ClientConnectOptions

Hashable ClientConnectResponseOptions 
Instance details

Defined in Amazonka.EC2.Types.ClientConnectResponseOptions

Hashable ClientData 
Instance details

Defined in Amazonka.EC2.Types.ClientData

Hashable ClientLoginBannerOptions 
Instance details

Defined in Amazonka.EC2.Types.ClientLoginBannerOptions

Hashable ClientLoginBannerResponseOptions 
Instance details

Defined in Amazonka.EC2.Types.ClientLoginBannerResponseOptions

Hashable ClientVpnAuthentication 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnAuthentication

Hashable ClientVpnAuthenticationRequest 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnAuthenticationRequest

Hashable ClientVpnAuthenticationType 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnAuthenticationType

Hashable ClientVpnAuthorizationRuleStatus 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnAuthorizationRuleStatus

Hashable ClientVpnAuthorizationRuleStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnAuthorizationRuleStatusCode

Hashable ClientVpnConnection 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnConnection

Hashable ClientVpnConnectionStatus 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnConnectionStatus

Hashable ClientVpnConnectionStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnConnectionStatusCode

Hashable ClientVpnEndpoint 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnEndpoint

Hashable ClientVpnEndpointAttributeStatus 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnEndpointAttributeStatus

Hashable ClientVpnEndpointAttributeStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnEndpointAttributeStatusCode

Hashable ClientVpnEndpointStatus 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnEndpointStatus

Hashable ClientVpnEndpointStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnEndpointStatusCode

Hashable ClientVpnRoute 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnRoute

Hashable ClientVpnRouteStatus 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnRouteStatus

Hashable ClientVpnRouteStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnRouteStatusCode

Hashable CloudWatchLogOptions 
Instance details

Defined in Amazonka.EC2.Types.CloudWatchLogOptions

Hashable CloudWatchLogOptionsSpecification 
Instance details

Defined in Amazonka.EC2.Types.CloudWatchLogOptionsSpecification

Hashable CoipAddressUsage 
Instance details

Defined in Amazonka.EC2.Types.CoipAddressUsage

Hashable CoipCidr 
Instance details

Defined in Amazonka.EC2.Types.CoipCidr

Methods

hashWithSalt :: Int -> CoipCidr -> Int #

hash :: CoipCidr -> Int #

Hashable CoipPool 
Instance details

Defined in Amazonka.EC2.Types.CoipPool

Methods

hashWithSalt :: Int -> CoipPool -> Int #

hash :: CoipPool -> Int #

Hashable ConnectionLogOptions 
Instance details

Defined in Amazonka.EC2.Types.ConnectionLogOptions

Hashable ConnectionLogResponseOptions 
Instance details

Defined in Amazonka.EC2.Types.ConnectionLogResponseOptions

Hashable ConnectionNotification 
Instance details

Defined in Amazonka.EC2.Types.ConnectionNotification

Hashable ConnectionNotificationState 
Instance details

Defined in Amazonka.EC2.Types.ConnectionNotificationState

Hashable ConnectionNotificationType 
Instance details

Defined in Amazonka.EC2.Types.ConnectionNotificationType

Hashable ConnectivityType 
Instance details

Defined in Amazonka.EC2.Types.ConnectivityType

Hashable ContainerFormat 
Instance details

Defined in Amazonka.EC2.Types.ContainerFormat

Hashable ConversionTask 
Instance details

Defined in Amazonka.EC2.Types.ConversionTask

Hashable ConversionTaskState 
Instance details

Defined in Amazonka.EC2.Types.ConversionTaskState

Hashable CopyTagsFromSource 
Instance details

Defined in Amazonka.EC2.Types.CopyTagsFromSource

Hashable CpuManufacturer 
Instance details

Defined in Amazonka.EC2.Types.CpuManufacturer

Hashable CpuOptions 
Instance details

Defined in Amazonka.EC2.Types.CpuOptions

Hashable CpuOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.CpuOptionsRequest

Hashable CreateFleetError 
Instance details

Defined in Amazonka.EC2.Types.CreateFleetError

Hashable CreateFleetInstance 
Instance details

Defined in Amazonka.EC2.Types.CreateFleetInstance

Hashable CreateTransitGatewayConnectRequestOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateTransitGatewayConnectRequestOptions

Hashable CreateTransitGatewayMulticastDomainRequestOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateTransitGatewayMulticastDomainRequestOptions

Hashable CreateTransitGatewayPeeringAttachmentRequestOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateTransitGatewayPeeringAttachmentRequestOptions

Hashable CreateTransitGatewayVpcAttachmentRequestOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateTransitGatewayVpcAttachmentRequestOptions

Hashable CreateVerifiedAccessEndpointEniOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateVerifiedAccessEndpointEniOptions

Hashable CreateVerifiedAccessEndpointLoadBalancerOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateVerifiedAccessEndpointLoadBalancerOptions

Hashable CreateVerifiedAccessTrustProviderDeviceOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateVerifiedAccessTrustProviderDeviceOptions

Hashable CreateVerifiedAccessTrustProviderOidcOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateVerifiedAccessTrustProviderOidcOptions

Hashable CreateVolumePermission 
Instance details

Defined in Amazonka.EC2.Types.CreateVolumePermission

Hashable CreateVolumePermissionModifications 
Instance details

Defined in Amazonka.EC2.Types.CreateVolumePermissionModifications

Hashable CreditSpecification 
Instance details

Defined in Amazonka.EC2.Types.CreditSpecification

Hashable CreditSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.CreditSpecificationRequest

Hashable CurrencyCodeValues 
Instance details

Defined in Amazonka.EC2.Types.CurrencyCodeValues

Hashable CustomerGateway 
Instance details

Defined in Amazonka.EC2.Types.CustomerGateway

Hashable DataQuery 
Instance details

Defined in Amazonka.EC2.Types.DataQuery

Hashable DataResponse 
Instance details

Defined in Amazonka.EC2.Types.DataResponse

Hashable DatafeedSubscriptionState 
Instance details

Defined in Amazonka.EC2.Types.DatafeedSubscriptionState

Hashable DefaultRouteTableAssociationValue 
Instance details

Defined in Amazonka.EC2.Types.DefaultRouteTableAssociationValue

Hashable DefaultRouteTablePropagationValue 
Instance details

Defined in Amazonka.EC2.Types.DefaultRouteTablePropagationValue

Hashable DefaultTargetCapacityType 
Instance details

Defined in Amazonka.EC2.Types.DefaultTargetCapacityType

Hashable DeleteFleetError 
Instance details

Defined in Amazonka.EC2.Types.DeleteFleetError

Hashable DeleteFleetErrorCode 
Instance details

Defined in Amazonka.EC2.Types.DeleteFleetErrorCode

Hashable DeleteFleetErrorItem 
Instance details

Defined in Amazonka.EC2.Types.DeleteFleetErrorItem

Hashable DeleteFleetSuccessItem 
Instance details

Defined in Amazonka.EC2.Types.DeleteFleetSuccessItem

Hashable DeleteLaunchTemplateVersionsResponseErrorItem 
Instance details

Defined in Amazonka.EC2.Types.DeleteLaunchTemplateVersionsResponseErrorItem

Hashable DeleteLaunchTemplateVersionsResponseSuccessItem 
Instance details

Defined in Amazonka.EC2.Types.DeleteLaunchTemplateVersionsResponseSuccessItem

Hashable DeleteQueuedReservedInstancesError 
Instance details

Defined in Amazonka.EC2.Types.DeleteQueuedReservedInstancesError

Hashable DeleteQueuedReservedInstancesErrorCode 
Instance details

Defined in Amazonka.EC2.Types.DeleteQueuedReservedInstancesErrorCode

Hashable DeregisterInstanceTagAttributeRequest 
Instance details

Defined in Amazonka.EC2.Types.DeregisterInstanceTagAttributeRequest

Hashable DescribeFastLaunchImagesSuccessItem 
Instance details

Defined in Amazonka.EC2.Types.DescribeFastLaunchImagesSuccessItem

Hashable DescribeFastSnapshotRestoreSuccessItem 
Instance details

Defined in Amazonka.EC2.Types.DescribeFastSnapshotRestoreSuccessItem

Hashable DescribeFleetError 
Instance details

Defined in Amazonka.EC2.Types.DescribeFleetError

Hashable DescribeFleetsInstances 
Instance details

Defined in Amazonka.EC2.Types.DescribeFleetsInstances

Hashable DestinationFileFormat 
Instance details

Defined in Amazonka.EC2.Types.DestinationFileFormat

Hashable DestinationOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.DestinationOptionsRequest

Hashable DestinationOptionsResponse 
Instance details

Defined in Amazonka.EC2.Types.DestinationOptionsResponse

Hashable DeviceOptions 
Instance details

Defined in Amazonka.EC2.Types.DeviceOptions

Hashable DeviceTrustProviderType 
Instance details

Defined in Amazonka.EC2.Types.DeviceTrustProviderType

Hashable DeviceType 
Instance details

Defined in Amazonka.EC2.Types.DeviceType

Hashable DhcpConfiguration 
Instance details

Defined in Amazonka.EC2.Types.DhcpConfiguration

Hashable DhcpOptions 
Instance details

Defined in Amazonka.EC2.Types.DhcpOptions

Hashable DirectoryServiceAuthentication 
Instance details

Defined in Amazonka.EC2.Types.DirectoryServiceAuthentication

Hashable DirectoryServiceAuthenticationRequest 
Instance details

Defined in Amazonka.EC2.Types.DirectoryServiceAuthenticationRequest

Hashable DisableFastSnapshotRestoreErrorItem 
Instance details

Defined in Amazonka.EC2.Types.DisableFastSnapshotRestoreErrorItem

Hashable DisableFastSnapshotRestoreStateError 
Instance details

Defined in Amazonka.EC2.Types.DisableFastSnapshotRestoreStateError

Hashable DisableFastSnapshotRestoreStateErrorItem 
Instance details

Defined in Amazonka.EC2.Types.DisableFastSnapshotRestoreStateErrorItem

Hashable DisableFastSnapshotRestoreSuccessItem 
Instance details

Defined in Amazonka.EC2.Types.DisableFastSnapshotRestoreSuccessItem

Hashable DiskImage 
Instance details

Defined in Amazonka.EC2.Types.DiskImage

Hashable DiskImageDescription 
Instance details

Defined in Amazonka.EC2.Types.DiskImageDescription

Hashable DiskImageDetail 
Instance details

Defined in Amazonka.EC2.Types.DiskImageDetail

Hashable DiskImageFormat 
Instance details

Defined in Amazonka.EC2.Types.DiskImageFormat

Hashable DiskImageVolumeDescription 
Instance details

Defined in Amazonka.EC2.Types.DiskImageVolumeDescription

Hashable DiskInfo 
Instance details

Defined in Amazonka.EC2.Types.DiskInfo

Methods

hashWithSalt :: Int -> DiskInfo -> Int #

hash :: DiskInfo -> Int #

Hashable DiskType 
Instance details

Defined in Amazonka.EC2.Types.DiskType

Methods

hashWithSalt :: Int -> DiskType -> Int #

hash :: DiskType -> Int #

Hashable DnsEntry 
Instance details

Defined in Amazonka.EC2.Types.DnsEntry

Methods

hashWithSalt :: Int -> DnsEntry -> Int #

hash :: DnsEntry -> Int #

Hashable DnsNameState 
Instance details

Defined in Amazonka.EC2.Types.DnsNameState

Hashable DnsOptions 
Instance details

Defined in Amazonka.EC2.Types.DnsOptions

Hashable DnsOptionsSpecification 
Instance details

Defined in Amazonka.EC2.Types.DnsOptionsSpecification

Hashable DnsRecordIpType 
Instance details

Defined in Amazonka.EC2.Types.DnsRecordIpType

Hashable DnsServersOptionsModifyStructure 
Instance details

Defined in Amazonka.EC2.Types.DnsServersOptionsModifyStructure

Hashable DnsSupportValue 
Instance details

Defined in Amazonka.EC2.Types.DnsSupportValue

Hashable DomainType 
Instance details

Defined in Amazonka.EC2.Types.DomainType

Hashable DynamicRoutingValue 
Instance details

Defined in Amazonka.EC2.Types.DynamicRoutingValue

Hashable EbsBlockDevice 
Instance details

Defined in Amazonka.EC2.Types.EbsBlockDevice

Hashable EbsEncryptionSupport 
Instance details

Defined in Amazonka.EC2.Types.EbsEncryptionSupport

Hashable EbsInfo 
Instance details

Defined in Amazonka.EC2.Types.EbsInfo

Methods

hashWithSalt :: Int -> EbsInfo -> Int #

hash :: EbsInfo -> Int #

Hashable EbsInstanceBlockDevice 
Instance details

Defined in Amazonka.EC2.Types.EbsInstanceBlockDevice

Hashable EbsInstanceBlockDeviceSpecification 
Instance details

Defined in Amazonka.EC2.Types.EbsInstanceBlockDeviceSpecification

Hashable EbsNvmeSupport 
Instance details

Defined in Amazonka.EC2.Types.EbsNvmeSupport

Hashable EbsOptimizedInfo 
Instance details

Defined in Amazonka.EC2.Types.EbsOptimizedInfo

Hashable EbsOptimizedSupport 
Instance details

Defined in Amazonka.EC2.Types.EbsOptimizedSupport

Hashable EfaInfo 
Instance details

Defined in Amazonka.EC2.Types.EfaInfo

Methods

hashWithSalt :: Int -> EfaInfo -> Int #

hash :: EfaInfo -> Int #

Hashable EgressOnlyInternetGateway 
Instance details

Defined in Amazonka.EC2.Types.EgressOnlyInternetGateway

Hashable ElasticGpuAssociation 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpuAssociation

Hashable ElasticGpuHealth 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpuHealth

Hashable ElasticGpuSpecification 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpuSpecification

Hashable ElasticGpuSpecificationResponse 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpuSpecificationResponse

Hashable ElasticGpuState 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpuState

Hashable ElasticGpuStatus 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpuStatus

Hashable ElasticGpus 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpus

Hashable ElasticInferenceAccelerator 
Instance details

Defined in Amazonka.EC2.Types.ElasticInferenceAccelerator

Hashable ElasticInferenceAcceleratorAssociation 
Instance details

Defined in Amazonka.EC2.Types.ElasticInferenceAcceleratorAssociation

Hashable EnaSrdSpecification 
Instance details

Defined in Amazonka.EC2.Types.EnaSrdSpecification

Hashable EnaSrdUdpSpecification 
Instance details

Defined in Amazonka.EC2.Types.EnaSrdUdpSpecification

Hashable EnaSupport 
Instance details

Defined in Amazonka.EC2.Types.EnaSupport

Hashable EnableFastSnapshotRestoreErrorItem 
Instance details

Defined in Amazonka.EC2.Types.EnableFastSnapshotRestoreErrorItem

Hashable EnableFastSnapshotRestoreStateError 
Instance details

Defined in Amazonka.EC2.Types.EnableFastSnapshotRestoreStateError

Hashable EnableFastSnapshotRestoreStateErrorItem 
Instance details

Defined in Amazonka.EC2.Types.EnableFastSnapshotRestoreStateErrorItem

Hashable EnableFastSnapshotRestoreSuccessItem 
Instance details

Defined in Amazonka.EC2.Types.EnableFastSnapshotRestoreSuccessItem

Hashable EnclaveOptions 
Instance details

Defined in Amazonka.EC2.Types.EnclaveOptions

Hashable EnclaveOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.EnclaveOptionsRequest

Hashable EndDateType 
Instance details

Defined in Amazonka.EC2.Types.EndDateType

Hashable EphemeralNvmeSupport 
Instance details

Defined in Amazonka.EC2.Types.EphemeralNvmeSupport

Hashable EventCode 
Instance details

Defined in Amazonka.EC2.Types.EventCode

Hashable EventInformation 
Instance details

Defined in Amazonka.EC2.Types.EventInformation

Hashable EventType 
Instance details

Defined in Amazonka.EC2.Types.EventType

Hashable ExcessCapacityTerminationPolicy 
Instance details

Defined in Amazonka.EC2.Types.ExcessCapacityTerminationPolicy

Hashable Explanation 
Instance details

Defined in Amazonka.EC2.Types.Explanation

Hashable ExportEnvironment 
Instance details

Defined in Amazonka.EC2.Types.ExportEnvironment

Hashable ExportImageTask 
Instance details

Defined in Amazonka.EC2.Types.ExportImageTask

Hashable ExportTask 
Instance details

Defined in Amazonka.EC2.Types.ExportTask

Hashable ExportTaskS3Location 
Instance details

Defined in Amazonka.EC2.Types.ExportTaskS3Location

Hashable ExportTaskS3LocationRequest 
Instance details

Defined in Amazonka.EC2.Types.ExportTaskS3LocationRequest

Hashable ExportTaskState 
Instance details

Defined in Amazonka.EC2.Types.ExportTaskState

Hashable ExportToS3Task 
Instance details

Defined in Amazonka.EC2.Types.ExportToS3Task

Hashable ExportToS3TaskSpecification 
Instance details

Defined in Amazonka.EC2.Types.ExportToS3TaskSpecification

Hashable FailedCapacityReservationFleetCancellationResult 
Instance details

Defined in Amazonka.EC2.Types.FailedCapacityReservationFleetCancellationResult

Hashable FailedQueuedPurchaseDeletion 
Instance details

Defined in Amazonka.EC2.Types.FailedQueuedPurchaseDeletion

Hashable FastLaunchLaunchTemplateSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.FastLaunchLaunchTemplateSpecificationRequest

Hashable FastLaunchLaunchTemplateSpecificationResponse 
Instance details

Defined in Amazonka.EC2.Types.FastLaunchLaunchTemplateSpecificationResponse

Hashable FastLaunchResourceType 
Instance details

Defined in Amazonka.EC2.Types.FastLaunchResourceType

Hashable FastLaunchSnapshotConfigurationRequest 
Instance details

Defined in Amazonka.EC2.Types.FastLaunchSnapshotConfigurationRequest

Hashable FastLaunchSnapshotConfigurationResponse 
Instance details

Defined in Amazonka.EC2.Types.FastLaunchSnapshotConfigurationResponse

Hashable FastLaunchStateCode 
Instance details

Defined in Amazonka.EC2.Types.FastLaunchStateCode

Hashable FastSnapshotRestoreStateCode 
Instance details

Defined in Amazonka.EC2.Types.FastSnapshotRestoreStateCode

Hashable FederatedAuthentication 
Instance details

Defined in Amazonka.EC2.Types.FederatedAuthentication

Hashable FederatedAuthenticationRequest 
Instance details

Defined in Amazonka.EC2.Types.FederatedAuthenticationRequest

Hashable Filter 
Instance details

Defined in Amazonka.EC2.Types.Filter

Methods

hashWithSalt :: Int -> Filter -> Int #

hash :: Filter -> Int #

Hashable FindingsFound 
Instance details

Defined in Amazonka.EC2.Types.FindingsFound

Hashable FleetActivityStatus 
Instance details

Defined in Amazonka.EC2.Types.FleetActivityStatus

Hashable FleetCapacityReservation 
Instance details

Defined in Amazonka.EC2.Types.FleetCapacityReservation

Hashable FleetCapacityReservationTenancy 
Instance details

Defined in Amazonka.EC2.Types.FleetCapacityReservationTenancy

Hashable FleetCapacityReservationUsageStrategy 
Instance details

Defined in Amazonka.EC2.Types.FleetCapacityReservationUsageStrategy

Hashable FleetData 
Instance details

Defined in Amazonka.EC2.Types.FleetData

Hashable FleetEventType 
Instance details

Defined in Amazonka.EC2.Types.FleetEventType

Hashable FleetExcessCapacityTerminationPolicy 
Instance details

Defined in Amazonka.EC2.Types.FleetExcessCapacityTerminationPolicy

Hashable FleetInstanceMatchCriteria 
Instance details

Defined in Amazonka.EC2.Types.FleetInstanceMatchCriteria

Hashable FleetLaunchTemplateConfig 
Instance details

Defined in Amazonka.EC2.Types.FleetLaunchTemplateConfig

Hashable FleetLaunchTemplateConfigRequest 
Instance details

Defined in Amazonka.EC2.Types.FleetLaunchTemplateConfigRequest

Hashable FleetLaunchTemplateOverrides 
Instance details

Defined in Amazonka.EC2.Types.FleetLaunchTemplateOverrides

Hashable FleetLaunchTemplateOverridesRequest 
Instance details

Defined in Amazonka.EC2.Types.FleetLaunchTemplateOverridesRequest

Hashable FleetLaunchTemplateSpecification 
Instance details

Defined in Amazonka.EC2.Types.FleetLaunchTemplateSpecification

Hashable FleetLaunchTemplateSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.FleetLaunchTemplateSpecificationRequest

Hashable FleetOnDemandAllocationStrategy 
Instance details

Defined in Amazonka.EC2.Types.FleetOnDemandAllocationStrategy

Hashable FleetReplacementStrategy 
Instance details

Defined in Amazonka.EC2.Types.FleetReplacementStrategy

Hashable FleetSpotCapacityRebalance 
Instance details

Defined in Amazonka.EC2.Types.FleetSpotCapacityRebalance

Hashable FleetSpotCapacityRebalanceRequest 
Instance details

Defined in Amazonka.EC2.Types.FleetSpotCapacityRebalanceRequest

Hashable FleetSpotMaintenanceStrategies 
Instance details

Defined in Amazonka.EC2.Types.FleetSpotMaintenanceStrategies

Hashable FleetSpotMaintenanceStrategiesRequest 
Instance details

Defined in Amazonka.EC2.Types.FleetSpotMaintenanceStrategiesRequest

Hashable FleetStateCode 
Instance details

Defined in Amazonka.EC2.Types.FleetStateCode

Hashable FleetType 
Instance details

Defined in Amazonka.EC2.Types.FleetType

Hashable FlowLog 
Instance details

Defined in Amazonka.EC2.Types.FlowLog

Methods

hashWithSalt :: Int -> FlowLog -> Int #

hash :: FlowLog -> Int #

Hashable FlowLogsResourceType 
Instance details

Defined in Amazonka.EC2.Types.FlowLogsResourceType

Hashable FpgaDeviceInfo 
Instance details

Defined in Amazonka.EC2.Types.FpgaDeviceInfo

Hashable FpgaDeviceMemoryInfo 
Instance details

Defined in Amazonka.EC2.Types.FpgaDeviceMemoryInfo

Hashable FpgaImage 
Instance details

Defined in Amazonka.EC2.Types.FpgaImage

Hashable FpgaImageAttribute 
Instance details

Defined in Amazonka.EC2.Types.FpgaImageAttribute

Hashable FpgaImageAttributeName 
Instance details

Defined in Amazonka.EC2.Types.FpgaImageAttributeName

Hashable FpgaImageState 
Instance details

Defined in Amazonka.EC2.Types.FpgaImageState

Hashable FpgaImageStateCode 
Instance details

Defined in Amazonka.EC2.Types.FpgaImageStateCode

Hashable FpgaInfo 
Instance details

Defined in Amazonka.EC2.Types.FpgaInfo

Methods

hashWithSalt :: Int -> FpgaInfo -> Int #

hash :: FpgaInfo -> Int #

Hashable GatewayAssociationState 
Instance details

Defined in Amazonka.EC2.Types.GatewayAssociationState

Hashable GatewayType 
Instance details

Defined in Amazonka.EC2.Types.GatewayType

Hashable GpuDeviceInfo 
Instance details

Defined in Amazonka.EC2.Types.GpuDeviceInfo

Hashable GpuDeviceMemoryInfo 
Instance details

Defined in Amazonka.EC2.Types.GpuDeviceMemoryInfo

Hashable GpuInfo 
Instance details

Defined in Amazonka.EC2.Types.GpuInfo

Methods

hashWithSalt :: Int -> GpuInfo -> Int #

hash :: GpuInfo -> Int #

Hashable GroupIdentifier 
Instance details

Defined in Amazonka.EC2.Types.GroupIdentifier

Hashable HibernationOptions 
Instance details

Defined in Amazonka.EC2.Types.HibernationOptions

Hashable HibernationOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.HibernationOptionsRequest

Hashable HistoryRecord 
Instance details

Defined in Amazonka.EC2.Types.HistoryRecord

Hashable HistoryRecordEntry 
Instance details

Defined in Amazonka.EC2.Types.HistoryRecordEntry

Hashable Host 
Instance details

Defined in Amazonka.EC2.Types.Host

Methods

hashWithSalt :: Int -> Host -> Int #

hash :: Host -> Int #

Hashable HostInstance 
Instance details

Defined in Amazonka.EC2.Types.HostInstance

Hashable HostOffering 
Instance details

Defined in Amazonka.EC2.Types.HostOffering

Hashable HostProperties 
Instance details

Defined in Amazonka.EC2.Types.HostProperties

Hashable HostRecovery 
Instance details

Defined in Amazonka.EC2.Types.HostRecovery

Hashable HostReservation 
Instance details

Defined in Amazonka.EC2.Types.HostReservation

Hashable HostTenancy 
Instance details

Defined in Amazonka.EC2.Types.HostTenancy

Hashable HostnameType 
Instance details

Defined in Amazonka.EC2.Types.HostnameType

Hashable HttpTokensState 
Instance details

Defined in Amazonka.EC2.Types.HttpTokensState

Hashable HypervisorType 
Instance details

Defined in Amazonka.EC2.Types.HypervisorType

Hashable IKEVersionsListValue 
Instance details

Defined in Amazonka.EC2.Types.IKEVersionsListValue

Hashable IKEVersionsRequestListValue 
Instance details

Defined in Amazonka.EC2.Types.IKEVersionsRequestListValue

Hashable IamInstanceProfile 
Instance details

Defined in Amazonka.EC2.Types.IamInstanceProfile

Hashable IamInstanceProfileAssociation 
Instance details

Defined in Amazonka.EC2.Types.IamInstanceProfileAssociation

Hashable IamInstanceProfileAssociationState 
Instance details

Defined in Amazonka.EC2.Types.IamInstanceProfileAssociationState

Hashable IamInstanceProfileSpecification 
Instance details

Defined in Amazonka.EC2.Types.IamInstanceProfileSpecification

Hashable IcmpTypeCode 
Instance details

Defined in Amazonka.EC2.Types.IcmpTypeCode

Hashable IdFormat 
Instance details

Defined in Amazonka.EC2.Types.IdFormat

Methods

hashWithSalt :: Int -> IdFormat -> Int #

hash :: IdFormat -> Int #

Hashable Igmpv2SupportValue 
Instance details

Defined in Amazonka.EC2.Types.Igmpv2SupportValue

Hashable Image 
Instance details

Defined in Amazonka.EC2.Types.Image

Methods

hashWithSalt :: Int -> Image -> Int #

hash :: Image -> Int #

Hashable ImageAttributeName 
Instance details

Defined in Amazonka.EC2.Types.ImageAttributeName

Hashable ImageDiskContainer 
Instance details

Defined in Amazonka.EC2.Types.ImageDiskContainer

Hashable ImageRecycleBinInfo 
Instance details

Defined in Amazonka.EC2.Types.ImageRecycleBinInfo

Hashable ImageState 
Instance details

Defined in Amazonka.EC2.Types.ImageState

Hashable ImageTypeValues 
Instance details

Defined in Amazonka.EC2.Types.ImageTypeValues

Hashable ImdsSupportValues 
Instance details

Defined in Amazonka.EC2.Types.ImdsSupportValues

Hashable ImportImageLicenseConfigurationRequest 
Instance details

Defined in Amazonka.EC2.Types.ImportImageLicenseConfigurationRequest

Hashable ImportImageLicenseConfigurationResponse 
Instance details

Defined in Amazonka.EC2.Types.ImportImageLicenseConfigurationResponse

Hashable ImportImageTask 
Instance details

Defined in Amazonka.EC2.Types.ImportImageTask

Hashable ImportInstanceLaunchSpecification 
Instance details

Defined in Amazonka.EC2.Types.ImportInstanceLaunchSpecification

Hashable ImportInstanceTaskDetails 
Instance details

Defined in Amazonka.EC2.Types.ImportInstanceTaskDetails

Hashable ImportInstanceVolumeDetailItem 
Instance details

Defined in Amazonka.EC2.Types.ImportInstanceVolumeDetailItem

Hashable ImportSnapshotTask 
Instance details

Defined in Amazonka.EC2.Types.ImportSnapshotTask

Hashable ImportVolumeTaskDetails 
Instance details

Defined in Amazonka.EC2.Types.ImportVolumeTaskDetails

Hashable InferenceAcceleratorInfo 
Instance details

Defined in Amazonka.EC2.Types.InferenceAcceleratorInfo

Hashable InferenceDeviceInfo 
Instance details

Defined in Amazonka.EC2.Types.InferenceDeviceInfo

Hashable Instance 
Instance details

Defined in Amazonka.EC2.Types.Instance

Methods

hashWithSalt :: Int -> Instance -> Int #

hash :: Instance -> Int #

Hashable InstanceAttributeName 
Instance details

Defined in Amazonka.EC2.Types.InstanceAttributeName

Hashable InstanceAutoRecoveryState 
Instance details

Defined in Amazonka.EC2.Types.InstanceAutoRecoveryState

Hashable InstanceBlockDeviceMapping 
Instance details

Defined in Amazonka.EC2.Types.InstanceBlockDeviceMapping

Hashable InstanceBlockDeviceMappingSpecification 
Instance details

Defined in Amazonka.EC2.Types.InstanceBlockDeviceMappingSpecification

Hashable InstanceCapacity 
Instance details

Defined in Amazonka.EC2.Types.InstanceCapacity

Hashable InstanceCount 
Instance details

Defined in Amazonka.EC2.Types.InstanceCount

Hashable InstanceCreditSpecification 
Instance details

Defined in Amazonka.EC2.Types.InstanceCreditSpecification

Hashable InstanceCreditSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceCreditSpecificationRequest

Hashable InstanceEventWindow 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindow

Hashable InstanceEventWindowAssociationRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindowAssociationRequest

Hashable InstanceEventWindowAssociationTarget 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindowAssociationTarget

Hashable InstanceEventWindowDisassociationRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindowDisassociationRequest

Hashable InstanceEventWindowState 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindowState

Hashable InstanceEventWindowStateChange 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindowStateChange

Hashable InstanceEventWindowTimeRange 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindowTimeRange

Hashable InstanceEventWindowTimeRangeRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindowTimeRangeRequest

Hashable InstanceExportDetails 
Instance details

Defined in Amazonka.EC2.Types.InstanceExportDetails

Hashable InstanceFamilyCreditSpecification 
Instance details

Defined in Amazonka.EC2.Types.InstanceFamilyCreditSpecification

Hashable InstanceGeneration 
Instance details

Defined in Amazonka.EC2.Types.InstanceGeneration

Hashable InstanceHealthStatus 
Instance details

Defined in Amazonka.EC2.Types.InstanceHealthStatus

Hashable InstanceInterruptionBehavior 
Instance details

Defined in Amazonka.EC2.Types.InstanceInterruptionBehavior

Hashable InstanceIpv4Prefix 
Instance details

Defined in Amazonka.EC2.Types.InstanceIpv4Prefix

Hashable InstanceIpv6Address 
Instance details

Defined in Amazonka.EC2.Types.InstanceIpv6Address

Hashable InstanceIpv6AddressRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceIpv6AddressRequest

Hashable InstanceIpv6Prefix 
Instance details

Defined in Amazonka.EC2.Types.InstanceIpv6Prefix

Hashable InstanceLifecycle 
Instance details

Defined in Amazonka.EC2.Types.InstanceLifecycle

Hashable InstanceLifecycleType 
Instance details

Defined in Amazonka.EC2.Types.InstanceLifecycleType

Hashable InstanceMaintenanceOptions 
Instance details

Defined in Amazonka.EC2.Types.InstanceMaintenanceOptions

Hashable InstanceMaintenanceOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceMaintenanceOptionsRequest

Hashable InstanceMarketOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceMarketOptionsRequest

Hashable InstanceMatchCriteria 
Instance details

Defined in Amazonka.EC2.Types.InstanceMatchCriteria

Hashable InstanceMetadataEndpointState 
Instance details

Defined in Amazonka.EC2.Types.InstanceMetadataEndpointState

Hashable InstanceMetadataOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceMetadataOptionsRequest

Hashable InstanceMetadataOptionsResponse 
Instance details

Defined in Amazonka.EC2.Types.InstanceMetadataOptionsResponse

Hashable InstanceMetadataOptionsState 
Instance details

Defined in Amazonka.EC2.Types.InstanceMetadataOptionsState

Hashable InstanceMetadataProtocolState 
Instance details

Defined in Amazonka.EC2.Types.InstanceMetadataProtocolState

Hashable InstanceMetadataTagsState 
Instance details

Defined in Amazonka.EC2.Types.InstanceMetadataTagsState

Hashable InstanceMonitoring 
Instance details

Defined in Amazonka.EC2.Types.InstanceMonitoring

Hashable InstanceNetworkInterface 
Instance details

Defined in Amazonka.EC2.Types.InstanceNetworkInterface

Hashable InstanceNetworkInterfaceAssociation 
Instance details

Defined in Amazonka.EC2.Types.InstanceNetworkInterfaceAssociation

Hashable InstanceNetworkInterfaceAttachment 
Instance details

Defined in Amazonka.EC2.Types.InstanceNetworkInterfaceAttachment

Hashable InstanceNetworkInterfaceSpecification 
Instance details

Defined in Amazonka.EC2.Types.InstanceNetworkInterfaceSpecification

Hashable InstancePrivateIpAddress 
Instance details

Defined in Amazonka.EC2.Types.InstancePrivateIpAddress

Hashable InstanceRequirements 
Instance details

Defined in Amazonka.EC2.Types.InstanceRequirements

Hashable InstanceRequirementsRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceRequirementsRequest

Hashable InstanceRequirementsWithMetadataRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceRequirementsWithMetadataRequest

Hashable InstanceSpecification 
Instance details

Defined in Amazonka.EC2.Types.InstanceSpecification

Hashable InstanceState 
Instance details

Defined in Amazonka.EC2.Types.InstanceState

Hashable InstanceStateChange 
Instance details

Defined in Amazonka.EC2.Types.InstanceStateChange

Hashable InstanceStateName 
Instance details

Defined in Amazonka.EC2.Types.InstanceStateName

Hashable InstanceStatus 
Instance details

Defined in Amazonka.EC2.Types.InstanceStatus

Hashable InstanceStatusDetails 
Instance details

Defined in Amazonka.EC2.Types.InstanceStatusDetails

Hashable InstanceStatusEvent 
Instance details

Defined in Amazonka.EC2.Types.InstanceStatusEvent

Hashable InstanceStatusSummary 
Instance details

Defined in Amazonka.EC2.Types.InstanceStatusSummary

Hashable InstanceStorageEncryptionSupport 
Instance details

Defined in Amazonka.EC2.Types.InstanceStorageEncryptionSupport

Hashable InstanceStorageInfo 
Instance details

Defined in Amazonka.EC2.Types.InstanceStorageInfo

Hashable InstanceTagNotificationAttribute 
Instance details

Defined in Amazonka.EC2.Types.InstanceTagNotificationAttribute

Hashable InstanceType 
Instance details

Defined in Amazonka.EC2.Types.InstanceType

Hashable InstanceTypeHypervisor 
Instance details

Defined in Amazonka.EC2.Types.InstanceTypeHypervisor

Hashable InstanceTypeInfo 
Instance details

Defined in Amazonka.EC2.Types.InstanceTypeInfo

Hashable InstanceTypeInfoFromInstanceRequirements 
Instance details

Defined in Amazonka.EC2.Types.InstanceTypeInfoFromInstanceRequirements

Hashable InstanceTypeOffering 
Instance details

Defined in Amazonka.EC2.Types.InstanceTypeOffering

Hashable InstanceUsage 
Instance details

Defined in Amazonka.EC2.Types.InstanceUsage

Hashable IntegrateServices 
Instance details

Defined in Amazonka.EC2.Types.IntegrateServices

Hashable InterfacePermissionType 
Instance details

Defined in Amazonka.EC2.Types.InterfacePermissionType

Hashable InterfaceProtocolType 
Instance details

Defined in Amazonka.EC2.Types.InterfaceProtocolType

Hashable InternetGateway 
Instance details

Defined in Amazonka.EC2.Types.InternetGateway

Hashable InternetGatewayAttachment 
Instance details

Defined in Amazonka.EC2.Types.InternetGatewayAttachment

Hashable IpAddressType 
Instance details

Defined in Amazonka.EC2.Types.IpAddressType

Hashable IpPermission 
Instance details

Defined in Amazonka.EC2.Types.IpPermission

Hashable IpRange 
Instance details

Defined in Amazonka.EC2.Types.IpRange

Methods

hashWithSalt :: Int -> IpRange -> Int #

hash :: IpRange -> Int #

Hashable Ipam 
Instance details

Defined in Amazonka.EC2.Types.Ipam

Methods

hashWithSalt :: Int -> Ipam -> Int #

hash :: Ipam -> Int #

Hashable IpamAddressHistoryRecord 
Instance details

Defined in Amazonka.EC2.Types.IpamAddressHistoryRecord

Hashable IpamAddressHistoryResourceType 
Instance details

Defined in Amazonka.EC2.Types.IpamAddressHistoryResourceType

Hashable IpamCidrAuthorizationContext 
Instance details

Defined in Amazonka.EC2.Types.IpamCidrAuthorizationContext

Hashable IpamComplianceStatus 
Instance details

Defined in Amazonka.EC2.Types.IpamComplianceStatus

Hashable IpamManagementState 
Instance details

Defined in Amazonka.EC2.Types.IpamManagementState

Hashable IpamOperatingRegion 
Instance details

Defined in Amazonka.EC2.Types.IpamOperatingRegion

Hashable IpamOverlapStatus 
Instance details

Defined in Amazonka.EC2.Types.IpamOverlapStatus

Hashable IpamPool 
Instance details

Defined in Amazonka.EC2.Types.IpamPool

Methods

hashWithSalt :: Int -> IpamPool -> Int #

hash :: IpamPool -> Int #

Hashable IpamPoolAllocation 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolAllocation

Hashable IpamPoolAllocationResourceType 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolAllocationResourceType

Hashable IpamPoolAwsService 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolAwsService

Hashable IpamPoolCidr 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolCidr

Hashable IpamPoolCidrFailureCode 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolCidrFailureCode

Hashable IpamPoolCidrFailureReason 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolCidrFailureReason

Hashable IpamPoolCidrState 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolCidrState

Hashable IpamPoolState 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolState

Hashable IpamResourceCidr 
Instance details

Defined in Amazonka.EC2.Types.IpamResourceCidr

Hashable IpamResourceTag 
Instance details

Defined in Amazonka.EC2.Types.IpamResourceTag

Hashable IpamResourceType 
Instance details

Defined in Amazonka.EC2.Types.IpamResourceType

Hashable IpamScope 
Instance details

Defined in Amazonka.EC2.Types.IpamScope

Hashable IpamScopeState 
Instance details

Defined in Amazonka.EC2.Types.IpamScopeState

Hashable IpamScopeType 
Instance details

Defined in Amazonka.EC2.Types.IpamScopeType

Hashable IpamState 
Instance details

Defined in Amazonka.EC2.Types.IpamState

Hashable Ipv4PrefixSpecification 
Instance details

Defined in Amazonka.EC2.Types.Ipv4PrefixSpecification

Hashable Ipv4PrefixSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.Ipv4PrefixSpecificationRequest

Hashable Ipv4PrefixSpecificationResponse 
Instance details

Defined in Amazonka.EC2.Types.Ipv4PrefixSpecificationResponse

Hashable Ipv6CidrAssociation 
Instance details

Defined in Amazonka.EC2.Types.Ipv6CidrAssociation

Hashable Ipv6CidrBlock 
Instance details

Defined in Amazonka.EC2.Types.Ipv6CidrBlock

Hashable Ipv6Pool 
Instance details

Defined in Amazonka.EC2.Types.Ipv6Pool

Methods

hashWithSalt :: Int -> Ipv6Pool -> Int #

hash :: Ipv6Pool -> Int #

Hashable Ipv6PrefixSpecification 
Instance details

Defined in Amazonka.EC2.Types.Ipv6PrefixSpecification

Hashable Ipv6PrefixSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.Ipv6PrefixSpecificationRequest

Hashable Ipv6PrefixSpecificationResponse 
Instance details

Defined in Amazonka.EC2.Types.Ipv6PrefixSpecificationResponse

Hashable Ipv6Range 
Instance details

Defined in Amazonka.EC2.Types.Ipv6Range

Hashable Ipv6SupportValue 
Instance details

Defined in Amazonka.EC2.Types.Ipv6SupportValue

Hashable KeyFormat 
Instance details

Defined in Amazonka.EC2.Types.KeyFormat

Hashable KeyPairInfo 
Instance details

Defined in Amazonka.EC2.Types.KeyPairInfo

Hashable KeyType 
Instance details

Defined in Amazonka.EC2.Types.KeyType

Methods

hashWithSalt :: Int -> KeyType -> Int #

hash :: KeyType -> Int #

Hashable LastError 
Instance details

Defined in Amazonka.EC2.Types.LastError

Hashable LaunchPermission 
Instance details

Defined in Amazonka.EC2.Types.LaunchPermission

Hashable LaunchPermissionModifications 
Instance details

Defined in Amazonka.EC2.Types.LaunchPermissionModifications

Hashable LaunchSpecification 
Instance details

Defined in Amazonka.EC2.Types.LaunchSpecification

Hashable LaunchTemplate 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplate

Hashable LaunchTemplateAndOverridesResponse 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateAndOverridesResponse

Hashable LaunchTemplateAutoRecoveryState 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateAutoRecoveryState

Hashable LaunchTemplateBlockDeviceMapping 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateBlockDeviceMapping

Hashable LaunchTemplateBlockDeviceMappingRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateBlockDeviceMappingRequest

Hashable LaunchTemplateCapacityReservationSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateCapacityReservationSpecificationRequest

Hashable LaunchTemplateCapacityReservationSpecificationResponse 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateCapacityReservationSpecificationResponse

Hashable LaunchTemplateConfig 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateConfig

Hashable LaunchTemplateCpuOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateCpuOptions

Hashable LaunchTemplateCpuOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateCpuOptionsRequest

Hashable LaunchTemplateEbsBlockDevice 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateEbsBlockDevice

Hashable LaunchTemplateEbsBlockDeviceRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateEbsBlockDeviceRequest

Hashable LaunchTemplateElasticInferenceAccelerator 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateElasticInferenceAccelerator

Hashable LaunchTemplateElasticInferenceAcceleratorResponse 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateElasticInferenceAcceleratorResponse

Hashable LaunchTemplateEnclaveOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateEnclaveOptions

Hashable LaunchTemplateEnclaveOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateEnclaveOptionsRequest

Hashable LaunchTemplateErrorCode 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateErrorCode

Hashable LaunchTemplateHibernationOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateHibernationOptions

Hashable LaunchTemplateHibernationOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateHibernationOptionsRequest

Hashable LaunchTemplateHttpTokensState 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateHttpTokensState

Hashable LaunchTemplateIamInstanceProfileSpecification 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateIamInstanceProfileSpecification

Hashable LaunchTemplateIamInstanceProfileSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateIamInstanceProfileSpecificationRequest

Hashable LaunchTemplateInstanceMaintenanceOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMaintenanceOptions

Hashable LaunchTemplateInstanceMaintenanceOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMaintenanceOptionsRequest

Hashable LaunchTemplateInstanceMarketOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMarketOptions

Hashable LaunchTemplateInstanceMarketOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMarketOptionsRequest

Hashable LaunchTemplateInstanceMetadataEndpointState 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMetadataEndpointState

Hashable LaunchTemplateInstanceMetadataOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMetadataOptions

Hashable LaunchTemplateInstanceMetadataOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMetadataOptionsRequest

Hashable LaunchTemplateInstanceMetadataOptionsState 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMetadataOptionsState

Hashable LaunchTemplateInstanceMetadataProtocolIpv6 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMetadataProtocolIpv6

Hashable LaunchTemplateInstanceMetadataTagsState 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMetadataTagsState

Hashable LaunchTemplateInstanceNetworkInterfaceSpecification 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceNetworkInterfaceSpecification

Hashable LaunchTemplateInstanceNetworkInterfaceSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceNetworkInterfaceSpecificationRequest

Hashable LaunchTemplateLicenseConfiguration 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateLicenseConfiguration

Hashable LaunchTemplateLicenseConfigurationRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateLicenseConfigurationRequest

Hashable LaunchTemplateOverrides 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateOverrides

Hashable LaunchTemplatePlacement 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplatePlacement

Hashable LaunchTemplatePlacementRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplatePlacementRequest

Hashable LaunchTemplatePrivateDnsNameOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplatePrivateDnsNameOptions

Hashable LaunchTemplatePrivateDnsNameOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplatePrivateDnsNameOptionsRequest

Hashable LaunchTemplateSpecification 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateSpecification

Hashable LaunchTemplateSpotMarketOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateSpotMarketOptions

Hashable LaunchTemplateSpotMarketOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateSpotMarketOptionsRequest

Hashable LaunchTemplateTagSpecification 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateTagSpecification

Hashable LaunchTemplateTagSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateTagSpecificationRequest

Hashable LaunchTemplateVersion 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateVersion

Hashable LaunchTemplatesMonitoring 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplatesMonitoring

Hashable LaunchTemplatesMonitoringRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplatesMonitoringRequest

Hashable LicenseConfiguration 
Instance details

Defined in Amazonka.EC2.Types.LicenseConfiguration

Hashable LicenseConfigurationRequest 
Instance details

Defined in Amazonka.EC2.Types.LicenseConfigurationRequest

Hashable ListingState 
Instance details

Defined in Amazonka.EC2.Types.ListingState

Hashable ListingStatus 
Instance details

Defined in Amazonka.EC2.Types.ListingStatus

Hashable LoadBalancersConfig 
Instance details

Defined in Amazonka.EC2.Types.LoadBalancersConfig

Hashable LoadPermission 
Instance details

Defined in Amazonka.EC2.Types.LoadPermission

Hashable LoadPermissionModifications 
Instance details

Defined in Amazonka.EC2.Types.LoadPermissionModifications

Hashable LoadPermissionRequest 
Instance details

Defined in Amazonka.EC2.Types.LoadPermissionRequest

Hashable LocalGateway 
Instance details

Defined in Amazonka.EC2.Types.LocalGateway

Hashable LocalGatewayRoute 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRoute

Hashable LocalGatewayRouteState 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRouteState

Hashable LocalGatewayRouteTable 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRouteTable

Hashable LocalGatewayRouteTableMode 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRouteTableMode

Hashable LocalGatewayRouteTableVirtualInterfaceGroupAssociation 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRouteTableVirtualInterfaceGroupAssociation

Hashable LocalGatewayRouteTableVpcAssociation 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRouteTableVpcAssociation

Hashable LocalGatewayRouteType 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRouteType

Hashable LocalGatewayVirtualInterface 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayVirtualInterface

Hashable LocalGatewayVirtualInterfaceGroup 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayVirtualInterfaceGroup

Hashable LocalStorage 
Instance details

Defined in Amazonka.EC2.Types.LocalStorage

Hashable LocalStorageType 
Instance details

Defined in Amazonka.EC2.Types.LocalStorageType

Hashable LocationType 
Instance details

Defined in Amazonka.EC2.Types.LocationType

Hashable LogDestinationType 
Instance details

Defined in Amazonka.EC2.Types.LogDestinationType

Hashable ManagedPrefixList 
Instance details

Defined in Amazonka.EC2.Types.ManagedPrefixList

Hashable MarketType 
Instance details

Defined in Amazonka.EC2.Types.MarketType

Hashable MembershipType 
Instance details

Defined in Amazonka.EC2.Types.MembershipType

Hashable MemoryGiBPerVCpu 
Instance details

Defined in Amazonka.EC2.Types.MemoryGiBPerVCpu

Hashable MemoryGiBPerVCpuRequest 
Instance details

Defined in Amazonka.EC2.Types.MemoryGiBPerVCpuRequest

Hashable MemoryInfo 
Instance details

Defined in Amazonka.EC2.Types.MemoryInfo

Hashable MemoryMiB 
Instance details

Defined in Amazonka.EC2.Types.MemoryMiB

Hashable MemoryMiBRequest 
Instance details

Defined in Amazonka.EC2.Types.MemoryMiBRequest

Hashable MetricPoint 
Instance details

Defined in Amazonka.EC2.Types.MetricPoint

Hashable MetricType 
Instance details

Defined in Amazonka.EC2.Types.MetricType

Hashable ModifyAvailabilityZoneOptInStatus 
Instance details

Defined in Amazonka.EC2.Types.ModifyAvailabilityZoneOptInStatus

Hashable ModifyTransitGatewayOptions 
Instance details

Defined in Amazonka.EC2.Types.ModifyTransitGatewayOptions

Hashable ModifyTransitGatewayVpcAttachmentRequestOptions 
Instance details

Defined in Amazonka.EC2.Types.ModifyTransitGatewayVpcAttachmentRequestOptions

Hashable ModifyVerifiedAccessEndpointEniOptions 
Instance details

Defined in Amazonka.EC2.Types.ModifyVerifiedAccessEndpointEniOptions

Hashable ModifyVerifiedAccessEndpointLoadBalancerOptions 
Instance details

Defined in Amazonka.EC2.Types.ModifyVerifiedAccessEndpointLoadBalancerOptions

Hashable ModifyVerifiedAccessTrustProviderOidcOptions 
Instance details

Defined in Amazonka.EC2.Types.ModifyVerifiedAccessTrustProviderOidcOptions

Hashable ModifyVpnTunnelOptionsSpecification 
Instance details

Defined in Amazonka.EC2.Types.ModifyVpnTunnelOptionsSpecification

Hashable Monitoring 
Instance details

Defined in Amazonka.EC2.Types.Monitoring

Hashable MonitoringState 
Instance details

Defined in Amazonka.EC2.Types.MonitoringState

Hashable MoveStatus 
Instance details

Defined in Amazonka.EC2.Types.MoveStatus

Hashable MovingAddressStatus 
Instance details

Defined in Amazonka.EC2.Types.MovingAddressStatus

Hashable MulticastSupportValue 
Instance details

Defined in Amazonka.EC2.Types.MulticastSupportValue

Hashable NatGateway 
Instance details

Defined in Amazonka.EC2.Types.NatGateway

Hashable NatGatewayAddress 
Instance details

Defined in Amazonka.EC2.Types.NatGatewayAddress

Hashable NatGatewayState 
Instance details

Defined in Amazonka.EC2.Types.NatGatewayState

Hashable NetworkAcl 
Instance details

Defined in Amazonka.EC2.Types.NetworkAcl

Hashable NetworkAclAssociation 
Instance details

Defined in Amazonka.EC2.Types.NetworkAclAssociation

Hashable NetworkAclEntry 
Instance details

Defined in Amazonka.EC2.Types.NetworkAclEntry

Hashable NetworkBandwidthGbps 
Instance details

Defined in Amazonka.EC2.Types.NetworkBandwidthGbps

Hashable NetworkBandwidthGbpsRequest 
Instance details

Defined in Amazonka.EC2.Types.NetworkBandwidthGbpsRequest

Hashable NetworkCardInfo 
Instance details

Defined in Amazonka.EC2.Types.NetworkCardInfo

Hashable NetworkInfo 
Instance details

Defined in Amazonka.EC2.Types.NetworkInfo

Hashable NetworkInsightsAccessScope 
Instance details

Defined in Amazonka.EC2.Types.NetworkInsightsAccessScope

Hashable NetworkInsightsAccessScopeAnalysis 
Instance details

Defined in Amazonka.EC2.Types.NetworkInsightsAccessScopeAnalysis

Hashable NetworkInsightsAccessScopeContent 
Instance details

Defined in Amazonka.EC2.Types.NetworkInsightsAccessScopeContent

Hashable NetworkInsightsAnalysis 
Instance details

Defined in Amazonka.EC2.Types.NetworkInsightsAnalysis

Hashable NetworkInsightsPath 
Instance details

Defined in Amazonka.EC2.Types.NetworkInsightsPath

Hashable NetworkInterface 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterface

Hashable NetworkInterfaceAssociation 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceAssociation

Hashable NetworkInterfaceAttachment 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceAttachment

Hashable NetworkInterfaceAttachmentChanges 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceAttachmentChanges

Hashable NetworkInterfaceAttribute 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceAttribute

Hashable NetworkInterfaceCount 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceCount

Hashable NetworkInterfaceCountRequest 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceCountRequest

Hashable NetworkInterfaceCreationType 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceCreationType

Hashable NetworkInterfaceIpv6Address 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceIpv6Address

Hashable NetworkInterfacePermission 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfacePermission

Hashable NetworkInterfacePermissionState 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfacePermissionState

Hashable NetworkInterfacePermissionStateCode 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfacePermissionStateCode

Hashable NetworkInterfacePrivateIpAddress 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfacePrivateIpAddress

Hashable NetworkInterfaceStatus 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceStatus

Hashable NetworkInterfaceType 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceType

Hashable NewDhcpConfiguration 
Instance details

Defined in Amazonka.EC2.Types.NewDhcpConfiguration

Hashable OfferingClassType 
Instance details

Defined in Amazonka.EC2.Types.OfferingClassType

Hashable OfferingTypeValues 
Instance details

Defined in Amazonka.EC2.Types.OfferingTypeValues

Hashable OidcOptions 
Instance details

Defined in Amazonka.EC2.Types.OidcOptions

Hashable OnDemandAllocationStrategy 
Instance details

Defined in Amazonka.EC2.Types.OnDemandAllocationStrategy

Hashable OnDemandOptions 
Instance details

Defined in Amazonka.EC2.Types.OnDemandOptions

Hashable OnDemandOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.OnDemandOptionsRequest

Hashable OperationType 
Instance details

Defined in Amazonka.EC2.Types.OperationType

Hashable PacketHeaderStatement 
Instance details

Defined in Amazonka.EC2.Types.PacketHeaderStatement

Hashable PacketHeaderStatementRequest 
Instance details

Defined in Amazonka.EC2.Types.PacketHeaderStatementRequest

Hashable PartitionLoadFrequency 
Instance details

Defined in Amazonka.EC2.Types.PartitionLoadFrequency

Hashable PathComponent 
Instance details

Defined in Amazonka.EC2.Types.PathComponent

Hashable PathStatement 
Instance details

Defined in Amazonka.EC2.Types.PathStatement

Hashable PathStatementRequest 
Instance details

Defined in Amazonka.EC2.Types.PathStatementRequest

Hashable PayerResponsibility 
Instance details

Defined in Amazonka.EC2.Types.PayerResponsibility

Hashable PaymentOption 
Instance details

Defined in Amazonka.EC2.Types.PaymentOption

Hashable PciId 
Instance details

Defined in Amazonka.EC2.Types.PciId

Methods

hashWithSalt :: Int -> PciId -> Int #

hash :: PciId -> Int #

Hashable PeeringAttachmentStatus 
Instance details

Defined in Amazonka.EC2.Types.PeeringAttachmentStatus

Hashable PeeringConnectionOptions 
Instance details

Defined in Amazonka.EC2.Types.PeeringConnectionOptions

Hashable PeeringConnectionOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.PeeringConnectionOptionsRequest

Hashable PeeringTgwInfo 
Instance details

Defined in Amazonka.EC2.Types.PeeringTgwInfo

Hashable PeriodType 
Instance details

Defined in Amazonka.EC2.Types.PeriodType

Hashable PermissionGroup 
Instance details

Defined in Amazonka.EC2.Types.PermissionGroup

Hashable Phase1DHGroupNumbersListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase1DHGroupNumbersListValue

Hashable Phase1DHGroupNumbersRequestListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase1DHGroupNumbersRequestListValue

Hashable Phase1EncryptionAlgorithmsListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase1EncryptionAlgorithmsListValue

Hashable Phase1EncryptionAlgorithmsRequestListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase1EncryptionAlgorithmsRequestListValue

Hashable Phase1IntegrityAlgorithmsListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase1IntegrityAlgorithmsListValue

Hashable Phase1IntegrityAlgorithmsRequestListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase1IntegrityAlgorithmsRequestListValue

Hashable Phase2DHGroupNumbersListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase2DHGroupNumbersListValue

Hashable Phase2DHGroupNumbersRequestListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase2DHGroupNumbersRequestListValue

Hashable Phase2EncryptionAlgorithmsListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase2EncryptionAlgorithmsListValue

Hashable Phase2EncryptionAlgorithmsRequestListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase2EncryptionAlgorithmsRequestListValue

Hashable Phase2IntegrityAlgorithmsListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase2IntegrityAlgorithmsListValue

Hashable Phase2IntegrityAlgorithmsRequestListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase2IntegrityAlgorithmsRequestListValue

Hashable Placement 
Instance details

Defined in Amazonka.EC2.Types.Placement

Hashable PlacementGroup 
Instance details

Defined in Amazonka.EC2.Types.PlacementGroup

Hashable PlacementGroupInfo 
Instance details

Defined in Amazonka.EC2.Types.PlacementGroupInfo

Hashable PlacementGroupState 
Instance details

Defined in Amazonka.EC2.Types.PlacementGroupState

Hashable PlacementGroupStrategy 
Instance details

Defined in Amazonka.EC2.Types.PlacementGroupStrategy

Hashable PlacementResponse 
Instance details

Defined in Amazonka.EC2.Types.PlacementResponse

Hashable PlacementStrategy 
Instance details

Defined in Amazonka.EC2.Types.PlacementStrategy

Hashable PlatformValues 
Instance details

Defined in Amazonka.EC2.Types.PlatformValues

Hashable PoolCidrBlock 
Instance details

Defined in Amazonka.EC2.Types.PoolCidrBlock

Hashable PortRange 
Instance details

Defined in Amazonka.EC2.Types.PortRange

Hashable PrefixList 
Instance details

Defined in Amazonka.EC2.Types.PrefixList

Hashable PrefixListAssociation 
Instance details

Defined in Amazonka.EC2.Types.PrefixListAssociation

Hashable PrefixListEntry 
Instance details

Defined in Amazonka.EC2.Types.PrefixListEntry

Hashable PrefixListId 
Instance details

Defined in Amazonka.EC2.Types.PrefixListId

Hashable PrefixListState 
Instance details

Defined in Amazonka.EC2.Types.PrefixListState

Hashable PriceSchedule 
Instance details

Defined in Amazonka.EC2.Types.PriceSchedule

Hashable PriceScheduleSpecification 
Instance details

Defined in Amazonka.EC2.Types.PriceScheduleSpecification

Hashable PricingDetail 
Instance details

Defined in Amazonka.EC2.Types.PricingDetail

Hashable PrincipalIdFormat 
Instance details

Defined in Amazonka.EC2.Types.PrincipalIdFormat

Hashable PrincipalType 
Instance details

Defined in Amazonka.EC2.Types.PrincipalType

Hashable PrivateDnsDetails 
Instance details

Defined in Amazonka.EC2.Types.PrivateDnsDetails

Hashable PrivateDnsNameConfiguration 
Instance details

Defined in Amazonka.EC2.Types.PrivateDnsNameConfiguration

Hashable PrivateDnsNameOptionsOnLaunch 
Instance details

Defined in Amazonka.EC2.Types.PrivateDnsNameOptionsOnLaunch

Hashable PrivateDnsNameOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.PrivateDnsNameOptionsRequest

Hashable PrivateDnsNameOptionsResponse 
Instance details

Defined in Amazonka.EC2.Types.PrivateDnsNameOptionsResponse

Hashable PrivateIpAddressSpecification 
Instance details

Defined in Amazonka.EC2.Types.PrivateIpAddressSpecification

Hashable ProcessorInfo 
Instance details

Defined in Amazonka.EC2.Types.ProcessorInfo

Hashable ProductCode 
Instance details

Defined in Amazonka.EC2.Types.ProductCode

Hashable ProductCodeValues 
Instance details

Defined in Amazonka.EC2.Types.ProductCodeValues

Hashable PropagatingVgw 
Instance details

Defined in Amazonka.EC2.Types.PropagatingVgw

Hashable Protocol 
Instance details

Defined in Amazonka.EC2.Types.Protocol

Methods

hashWithSalt :: Int -> Protocol -> Int #

hash :: Protocol -> Int #

Hashable ProtocolValue 
Instance details

Defined in Amazonka.EC2.Types.ProtocolValue

Hashable ProvisionedBandwidth 
Instance details

Defined in Amazonka.EC2.Types.ProvisionedBandwidth

Hashable PtrUpdateStatus 
Instance details

Defined in Amazonka.EC2.Types.PtrUpdateStatus

Hashable PublicIpv4Pool 
Instance details

Defined in Amazonka.EC2.Types.PublicIpv4Pool

Hashable PublicIpv4PoolRange 
Instance details

Defined in Amazonka.EC2.Types.PublicIpv4PoolRange

Hashable Purchase 
Instance details

Defined in Amazonka.EC2.Types.Purchase

Methods

hashWithSalt :: Int -> Purchase -> Int #

hash :: Purchase -> Int #

Hashable PurchaseRequest 
Instance details

Defined in Amazonka.EC2.Types.PurchaseRequest

Hashable RIProductDescription 
Instance details

Defined in Amazonka.EC2.Types.RIProductDescription

Hashable RecurringCharge 
Instance details

Defined in Amazonka.EC2.Types.RecurringCharge

Hashable RecurringChargeFrequency 
Instance details

Defined in Amazonka.EC2.Types.RecurringChargeFrequency

Hashable ReferencedSecurityGroup 
Instance details

Defined in Amazonka.EC2.Types.ReferencedSecurityGroup

Hashable RegionInfo 
Instance details

Defined in Amazonka.EC2.Types.RegionInfo

Hashable RegisterInstanceTagAttributeRequest 
Instance details

Defined in Amazonka.EC2.Types.RegisterInstanceTagAttributeRequest

Hashable RemoveIpamOperatingRegion 
Instance details

Defined in Amazonka.EC2.Types.RemoveIpamOperatingRegion

Hashable RemovePrefixListEntry 
Instance details

Defined in Amazonka.EC2.Types.RemovePrefixListEntry

Hashable ReplaceRootVolumeTask 
Instance details

Defined in Amazonka.EC2.Types.ReplaceRootVolumeTask

Hashable ReplaceRootVolumeTaskState 
Instance details

Defined in Amazonka.EC2.Types.ReplaceRootVolumeTaskState

Hashable ReplacementStrategy 
Instance details

Defined in Amazonka.EC2.Types.ReplacementStrategy

Hashable ReportInstanceReasonCodes 
Instance details

Defined in Amazonka.EC2.Types.ReportInstanceReasonCodes

Hashable ReportStatusType 
Instance details

Defined in Amazonka.EC2.Types.ReportStatusType

Hashable RequestIpamResourceTag 
Instance details

Defined in Amazonka.EC2.Types.RequestIpamResourceTag

Hashable RequestLaunchTemplateData 
Instance details

Defined in Amazonka.EC2.Types.RequestLaunchTemplateData

Hashable RequestSpotLaunchSpecification 
Instance details

Defined in Amazonka.EC2.Types.RequestSpotLaunchSpecification

Hashable Reservation 
Instance details

Defined in Amazonka.EC2.Types.Reservation

Hashable ReservationFleetInstanceSpecification 
Instance details

Defined in Amazonka.EC2.Types.ReservationFleetInstanceSpecification

Hashable ReservationState 
Instance details

Defined in Amazonka.EC2.Types.ReservationState

Hashable ReservationValue 
Instance details

Defined in Amazonka.EC2.Types.ReservationValue

Hashable ReservedInstanceLimitPrice 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstanceLimitPrice

Hashable ReservedInstanceReservationValue 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstanceReservationValue

Hashable ReservedInstanceState 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstanceState

Hashable ReservedInstances 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstances

Hashable ReservedInstancesConfiguration 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstancesConfiguration

Hashable ReservedInstancesId 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstancesId

Hashable ReservedInstancesListing 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstancesListing

Hashable ReservedInstancesModification 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstancesModification

Hashable ReservedInstancesModificationResult 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstancesModificationResult

Hashable ReservedInstancesOffering 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstancesOffering

Hashable ResetFpgaImageAttributeName 
Instance details

Defined in Amazonka.EC2.Types.ResetFpgaImageAttributeName

Hashable ResetImageAttributeName 
Instance details

Defined in Amazonka.EC2.Types.ResetImageAttributeName

Hashable ResourceStatement 
Instance details

Defined in Amazonka.EC2.Types.ResourceStatement

Hashable ResourceStatementRequest 
Instance details

Defined in Amazonka.EC2.Types.ResourceStatementRequest

Hashable ResourceType 
Instance details

Defined in Amazonka.EC2.Types.ResourceType

Hashable ResponseError 
Instance details

Defined in Amazonka.EC2.Types.ResponseError

Hashable ResponseLaunchTemplateData 
Instance details

Defined in Amazonka.EC2.Types.ResponseLaunchTemplateData

Hashable RootDeviceType 
Instance details

Defined in Amazonka.EC2.Types.RootDeviceType

Hashable Route 
Instance details

Defined in Amazonka.EC2.Types.Route

Methods

hashWithSalt :: Int -> Route -> Int #

hash :: Route -> Int #

Hashable RouteOrigin 
Instance details

Defined in Amazonka.EC2.Types.RouteOrigin

Hashable RouteState 
Instance details

Defined in Amazonka.EC2.Types.RouteState

Hashable RouteTable 
Instance details

Defined in Amazonka.EC2.Types.RouteTable

Hashable RouteTableAssociation 
Instance details

Defined in Amazonka.EC2.Types.RouteTableAssociation

Hashable RouteTableAssociationState 
Instance details

Defined in Amazonka.EC2.Types.RouteTableAssociationState

Hashable RouteTableAssociationStateCode 
Instance details

Defined in Amazonka.EC2.Types.RouteTableAssociationStateCode

Hashable RuleAction 
Instance details

Defined in Amazonka.EC2.Types.RuleAction

Hashable RunInstancesMonitoringEnabled 
Instance details

Defined in Amazonka.EC2.Types.RunInstancesMonitoringEnabled

Hashable S3ObjectTag 
Instance details

Defined in Amazonka.EC2.Types.S3ObjectTag

Hashable S3Storage 
Instance details

Defined in Amazonka.EC2.Types.S3Storage

Hashable ScheduledInstance 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstance

Hashable ScheduledInstanceAvailability 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstanceAvailability

Hashable ScheduledInstanceRecurrence 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstanceRecurrence

Hashable ScheduledInstanceRecurrenceRequest 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstanceRecurrenceRequest

Hashable ScheduledInstancesBlockDeviceMapping 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesBlockDeviceMapping

Hashable ScheduledInstancesEbs 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesEbs

Hashable ScheduledInstancesIamInstanceProfile 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesIamInstanceProfile

Hashable ScheduledInstancesIpv6Address 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesIpv6Address

Hashable ScheduledInstancesLaunchSpecification 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesLaunchSpecification

Hashable ScheduledInstancesMonitoring 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesMonitoring

Hashable ScheduledInstancesNetworkInterface 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesNetworkInterface

Hashable ScheduledInstancesPlacement 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesPlacement

Hashable ScheduledInstancesPrivateIpAddressConfig 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesPrivateIpAddressConfig

Hashable Scope 
Instance details

Defined in Amazonka.EC2.Types.Scope

Methods

hashWithSalt :: Int -> Scope -> Int #

hash :: Scope -> Int #

Hashable SecurityGroup 
Instance details

Defined in Amazonka.EC2.Types.SecurityGroup

Hashable SecurityGroupIdentifier 
Instance details

Defined in Amazonka.EC2.Types.SecurityGroupIdentifier

Hashable SecurityGroupReference 
Instance details

Defined in Amazonka.EC2.Types.SecurityGroupReference

Hashable SecurityGroupRule 
Instance details

Defined in Amazonka.EC2.Types.SecurityGroupRule

Hashable SecurityGroupRuleDescription 
Instance details

Defined in Amazonka.EC2.Types.SecurityGroupRuleDescription

Hashable SecurityGroupRuleRequest 
Instance details

Defined in Amazonka.EC2.Types.SecurityGroupRuleRequest

Hashable SecurityGroupRuleUpdate 
Instance details

Defined in Amazonka.EC2.Types.SecurityGroupRuleUpdate

Hashable SelfServicePortal 
Instance details

Defined in Amazonka.EC2.Types.SelfServicePortal

Hashable ServiceConfiguration 
Instance details

Defined in Amazonka.EC2.Types.ServiceConfiguration

Hashable ServiceConnectivityType 
Instance details

Defined in Amazonka.EC2.Types.ServiceConnectivityType

Hashable ServiceDetail 
Instance details

Defined in Amazonka.EC2.Types.ServiceDetail

Hashable ServiceState 
Instance details

Defined in Amazonka.EC2.Types.ServiceState

Hashable ServiceType 
Instance details

Defined in Amazonka.EC2.Types.ServiceType

Hashable ServiceTypeDetail 
Instance details

Defined in Amazonka.EC2.Types.ServiceTypeDetail

Hashable ShutdownBehavior 
Instance details

Defined in Amazonka.EC2.Types.ShutdownBehavior

Hashable SlotDateTimeRangeRequest 
Instance details

Defined in Amazonka.EC2.Types.SlotDateTimeRangeRequest

Hashable SlotStartTimeRangeRequest 
Instance details

Defined in Amazonka.EC2.Types.SlotStartTimeRangeRequest

Hashable Snapshot 
Instance details

Defined in Amazonka.EC2.Types.Snapshot

Methods

hashWithSalt :: Int -> Snapshot -> Int #

hash :: Snapshot -> Int #

Hashable SnapshotAttributeName 
Instance details

Defined in Amazonka.EC2.Types.SnapshotAttributeName

Hashable SnapshotDetail 
Instance details

Defined in Amazonka.EC2.Types.SnapshotDetail

Hashable SnapshotDiskContainer 
Instance details

Defined in Amazonka.EC2.Types.SnapshotDiskContainer

Hashable SnapshotInfo 
Instance details

Defined in Amazonka.EC2.Types.SnapshotInfo

Hashable SnapshotRecycleBinInfo 
Instance details

Defined in Amazonka.EC2.Types.SnapshotRecycleBinInfo

Hashable SnapshotState 
Instance details

Defined in Amazonka.EC2.Types.SnapshotState

Hashable SnapshotTaskDetail 
Instance details

Defined in Amazonka.EC2.Types.SnapshotTaskDetail

Hashable SnapshotTierStatus 
Instance details

Defined in Amazonka.EC2.Types.SnapshotTierStatus

Hashable SpotAllocationStrategy 
Instance details

Defined in Amazonka.EC2.Types.SpotAllocationStrategy

Hashable SpotCapacityRebalance 
Instance details

Defined in Amazonka.EC2.Types.SpotCapacityRebalance

Hashable SpotDatafeedSubscription 
Instance details

Defined in Amazonka.EC2.Types.SpotDatafeedSubscription

Hashable SpotFleetLaunchSpecification 
Instance details

Defined in Amazonka.EC2.Types.SpotFleetLaunchSpecification

Hashable SpotFleetMonitoring 
Instance details

Defined in Amazonka.EC2.Types.SpotFleetMonitoring

Hashable SpotFleetRequestConfig 
Instance details

Defined in Amazonka.EC2.Types.SpotFleetRequestConfig

Hashable SpotFleetRequestConfigData 
Instance details

Defined in Amazonka.EC2.Types.SpotFleetRequestConfigData

Hashable SpotFleetTagSpecification 
Instance details

Defined in Amazonka.EC2.Types.SpotFleetTagSpecification

Hashable SpotInstanceInterruptionBehavior 
Instance details

Defined in Amazonka.EC2.Types.SpotInstanceInterruptionBehavior

Hashable SpotInstanceRequest 
Instance details

Defined in Amazonka.EC2.Types.SpotInstanceRequest

Hashable SpotInstanceState 
Instance details

Defined in Amazonka.EC2.Types.SpotInstanceState

Hashable SpotInstanceStateFault 
Instance details

Defined in Amazonka.EC2.Types.SpotInstanceStateFault

Hashable SpotInstanceStatus 
Instance details

Defined in Amazonka.EC2.Types.SpotInstanceStatus

Hashable SpotInstanceType 
Instance details

Defined in Amazonka.EC2.Types.SpotInstanceType

Hashable SpotMaintenanceStrategies 
Instance details

Defined in Amazonka.EC2.Types.SpotMaintenanceStrategies

Hashable SpotMarketOptions 
Instance details

Defined in Amazonka.EC2.Types.SpotMarketOptions

Hashable SpotOptions 
Instance details

Defined in Amazonka.EC2.Types.SpotOptions

Hashable SpotOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.SpotOptionsRequest

Hashable SpotPlacement 
Instance details

Defined in Amazonka.EC2.Types.SpotPlacement

Hashable SpotPlacementScore 
Instance details

Defined in Amazonka.EC2.Types.SpotPlacementScore

Hashable SpotPrice 
Instance details

Defined in Amazonka.EC2.Types.SpotPrice

Hashable SpreadLevel 
Instance details

Defined in Amazonka.EC2.Types.SpreadLevel

Hashable StaleIpPermission 
Instance details

Defined in Amazonka.EC2.Types.StaleIpPermission

Hashable StaleSecurityGroup 
Instance details

Defined in Amazonka.EC2.Types.StaleSecurityGroup

Hashable State 
Instance details

Defined in Amazonka.EC2.Types.State

Methods

hashWithSalt :: Int -> State -> Int #

hash :: State -> Int #

Hashable StateReason 
Instance details

Defined in Amazonka.EC2.Types.StateReason

Hashable StaticSourcesSupportValue 
Instance details

Defined in Amazonka.EC2.Types.StaticSourcesSupportValue

Hashable StatisticType 
Instance details

Defined in Amazonka.EC2.Types.StatisticType

Hashable StatusName 
Instance details

Defined in Amazonka.EC2.Types.StatusName

Hashable StatusType 
Instance details

Defined in Amazonka.EC2.Types.StatusType

Hashable Storage 
Instance details

Defined in Amazonka.EC2.Types.Storage

Methods

hashWithSalt :: Int -> Storage -> Int #

hash :: Storage -> Int #

Hashable StorageLocation 
Instance details

Defined in Amazonka.EC2.Types.StorageLocation

Hashable StorageTier 
Instance details

Defined in Amazonka.EC2.Types.StorageTier

Hashable StoreImageTaskResult 
Instance details

Defined in Amazonka.EC2.Types.StoreImageTaskResult

Hashable Subnet 
Instance details

Defined in Amazonka.EC2.Types.Subnet

Methods

hashWithSalt :: Int -> Subnet -> Int #

hash :: Subnet -> Int #

Hashable SubnetAssociation 
Instance details

Defined in Amazonka.EC2.Types.SubnetAssociation

Hashable SubnetCidrBlockState 
Instance details

Defined in Amazonka.EC2.Types.SubnetCidrBlockState

Hashable SubnetCidrBlockStateCode 
Instance details

Defined in Amazonka.EC2.Types.SubnetCidrBlockStateCode

Hashable SubnetCidrReservation 
Instance details

Defined in Amazonka.EC2.Types.SubnetCidrReservation

Hashable SubnetCidrReservationType 
Instance details

Defined in Amazonka.EC2.Types.SubnetCidrReservationType

Hashable SubnetIpv6CidrBlockAssociation 
Instance details

Defined in Amazonka.EC2.Types.SubnetIpv6CidrBlockAssociation

Hashable SubnetState 
Instance details

Defined in Amazonka.EC2.Types.SubnetState

Hashable Subscription 
Instance details

Defined in Amazonka.EC2.Types.Subscription

Hashable SuccessfulInstanceCreditSpecificationItem 
Instance details

Defined in Amazonka.EC2.Types.SuccessfulInstanceCreditSpecificationItem

Hashable SuccessfulQueuedPurchaseDeletion 
Instance details

Defined in Amazonka.EC2.Types.SuccessfulQueuedPurchaseDeletion

Hashable SummaryStatus 
Instance details

Defined in Amazonka.EC2.Types.SummaryStatus

Hashable Tag 
Instance details

Defined in Amazonka.EC2.Types.Tag

Methods

hashWithSalt :: Int -> Tag -> Int #

hash :: Tag -> Int #

Hashable TagDescription 
Instance details

Defined in Amazonka.EC2.Types.TagDescription

Hashable TagSpecification 
Instance details

Defined in Amazonka.EC2.Types.TagSpecification

Hashable TargetCapacitySpecification 
Instance details

Defined in Amazonka.EC2.Types.TargetCapacitySpecification

Hashable TargetCapacitySpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.TargetCapacitySpecificationRequest

Hashable TargetCapacityUnitType 
Instance details

Defined in Amazonka.EC2.Types.TargetCapacityUnitType

Hashable TargetConfiguration 
Instance details

Defined in Amazonka.EC2.Types.TargetConfiguration

Hashable TargetConfigurationRequest 
Instance details

Defined in Amazonka.EC2.Types.TargetConfigurationRequest

Hashable TargetGroup 
Instance details

Defined in Amazonka.EC2.Types.TargetGroup

Hashable TargetGroupsConfig 
Instance details

Defined in Amazonka.EC2.Types.TargetGroupsConfig

Hashable TargetNetwork 
Instance details

Defined in Amazonka.EC2.Types.TargetNetwork

Hashable TargetReservationValue 
Instance details

Defined in Amazonka.EC2.Types.TargetReservationValue

Hashable TargetStorageTier 
Instance details

Defined in Amazonka.EC2.Types.TargetStorageTier

Hashable TelemetryStatus 
Instance details

Defined in Amazonka.EC2.Types.TelemetryStatus

Hashable Tenancy 
Instance details

Defined in Amazonka.EC2.Types.Tenancy

Methods

hashWithSalt :: Int -> Tenancy -> Int #

hash :: Tenancy -> Int #

Hashable TerminateConnectionStatus 
Instance details

Defined in Amazonka.EC2.Types.TerminateConnectionStatus

Hashable ThroughResourcesStatement 
Instance details

Defined in Amazonka.EC2.Types.ThroughResourcesStatement

Hashable ThroughResourcesStatementRequest 
Instance details

Defined in Amazonka.EC2.Types.ThroughResourcesStatementRequest

Hashable TieringOperationStatus 
Instance details

Defined in Amazonka.EC2.Types.TieringOperationStatus

Hashable TotalLocalStorageGB 
Instance details

Defined in Amazonka.EC2.Types.TotalLocalStorageGB

Hashable TotalLocalStorageGBRequest 
Instance details

Defined in Amazonka.EC2.Types.TotalLocalStorageGBRequest

Hashable TpmSupportValues 
Instance details

Defined in Amazonka.EC2.Types.TpmSupportValues

Hashable TrafficDirection 
Instance details

Defined in Amazonka.EC2.Types.TrafficDirection

Hashable TrafficMirrorFilter 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorFilter

Hashable TrafficMirrorFilterRule 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorFilterRule

Hashable TrafficMirrorFilterRuleField 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorFilterRuleField

Hashable TrafficMirrorNetworkService 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorNetworkService

Hashable TrafficMirrorPortRange 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorPortRange

Hashable TrafficMirrorPortRangeRequest 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorPortRangeRequest

Hashable TrafficMirrorRuleAction 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorRuleAction

Hashable TrafficMirrorSession 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorSession

Hashable TrafficMirrorSessionField 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorSessionField

Hashable TrafficMirrorTarget 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorTarget

Hashable TrafficMirrorTargetType 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorTargetType

Hashable TrafficType 
Instance details

Defined in Amazonka.EC2.Types.TrafficType

Hashable TransitGateway 
Instance details

Defined in Amazonka.EC2.Types.TransitGateway

Hashable TransitGatewayAssociation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAssociation

Hashable TransitGatewayAssociationState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAssociationState

Hashable TransitGatewayAttachment 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAttachment

Hashable TransitGatewayAttachmentAssociation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAttachmentAssociation

Hashable TransitGatewayAttachmentBgpConfiguration 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAttachmentBgpConfiguration

Hashable TransitGatewayAttachmentPropagation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAttachmentPropagation

Hashable TransitGatewayAttachmentResourceType 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAttachmentResourceType

Hashable TransitGatewayAttachmentState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAttachmentState

Hashable TransitGatewayConnect 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayConnect

Hashable TransitGatewayConnectOptions 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayConnectOptions

Hashable TransitGatewayConnectPeer 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayConnectPeer

Hashable TransitGatewayConnectPeerConfiguration 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayConnectPeerConfiguration

Hashable TransitGatewayConnectPeerState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayConnectPeerState

Hashable TransitGatewayConnectRequestBgpOptions 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayConnectRequestBgpOptions

Hashable TransitGatewayMulitcastDomainAssociationState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulitcastDomainAssociationState

Hashable TransitGatewayMulticastDeregisteredGroupMembers 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastDeregisteredGroupMembers

Hashable TransitGatewayMulticastDeregisteredGroupSources 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastDeregisteredGroupSources

Hashable TransitGatewayMulticastDomain 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastDomain

Hashable TransitGatewayMulticastDomainAssociation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastDomainAssociation

Hashable TransitGatewayMulticastDomainAssociations 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastDomainAssociations

Hashable TransitGatewayMulticastDomainOptions 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastDomainOptions

Hashable TransitGatewayMulticastDomainState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastDomainState

Hashable TransitGatewayMulticastGroup 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastGroup

Hashable TransitGatewayMulticastRegisteredGroupMembers 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastRegisteredGroupMembers

Hashable TransitGatewayMulticastRegisteredGroupSources 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastRegisteredGroupSources

Hashable TransitGatewayOptions 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayOptions

Hashable TransitGatewayPeeringAttachment 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPeeringAttachment

Hashable TransitGatewayPeeringAttachmentOptions 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPeeringAttachmentOptions

Hashable TransitGatewayPolicyRule 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPolicyRule

Hashable TransitGatewayPolicyRuleMetaData 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPolicyRuleMetaData

Hashable TransitGatewayPolicyTable 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPolicyTable

Hashable TransitGatewayPolicyTableAssociation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPolicyTableAssociation

Hashable TransitGatewayPolicyTableEntry 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPolicyTableEntry

Hashable TransitGatewayPolicyTableState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPolicyTableState

Hashable TransitGatewayPrefixListAttachment 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPrefixListAttachment

Hashable TransitGatewayPrefixListReference 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPrefixListReference

Hashable TransitGatewayPrefixListReferenceState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPrefixListReferenceState

Hashable TransitGatewayPropagation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPropagation

Hashable TransitGatewayPropagationState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPropagationState

Hashable TransitGatewayRequestOptions 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRequestOptions

Hashable TransitGatewayRoute 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRoute

Hashable TransitGatewayRouteAttachment 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteAttachment

Hashable TransitGatewayRouteState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteState

Hashable TransitGatewayRouteTable 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTable

Hashable TransitGatewayRouteTableAnnouncement 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTableAnnouncement

Hashable TransitGatewayRouteTableAnnouncementDirection 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTableAnnouncementDirection

Hashable TransitGatewayRouteTableAnnouncementState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTableAnnouncementState

Hashable TransitGatewayRouteTableAssociation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTableAssociation

Hashable TransitGatewayRouteTablePropagation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTablePropagation

Hashable TransitGatewayRouteTableRoute 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTableRoute

Hashable TransitGatewayRouteTableState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTableState

Hashable TransitGatewayRouteType 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteType

Hashable TransitGatewayState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayState

Hashable TransitGatewayVpcAttachment 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayVpcAttachment

Hashable TransitGatewayVpcAttachmentOptions 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayVpcAttachmentOptions

Hashable TransportProtocol 
Instance details

Defined in Amazonka.EC2.Types.TransportProtocol

Hashable TrunkInterfaceAssociation 
Instance details

Defined in Amazonka.EC2.Types.TrunkInterfaceAssociation

Hashable TrustProviderType 
Instance details

Defined in Amazonka.EC2.Types.TrustProviderType

Hashable TunnelInsideIpVersion 
Instance details

Defined in Amazonka.EC2.Types.TunnelInsideIpVersion

Hashable TunnelOption 
Instance details

Defined in Amazonka.EC2.Types.TunnelOption

Hashable UnlimitedSupportedInstanceFamily 
Instance details

Defined in Amazonka.EC2.Types.UnlimitedSupportedInstanceFamily

Hashable UnsuccessfulInstanceCreditSpecificationErrorCode 
Instance details

Defined in Amazonka.EC2.Types.UnsuccessfulInstanceCreditSpecificationErrorCode

Hashable UnsuccessfulInstanceCreditSpecificationItem 
Instance details

Defined in Amazonka.EC2.Types.UnsuccessfulInstanceCreditSpecificationItem

Hashable UnsuccessfulInstanceCreditSpecificationItemError 
Instance details

Defined in Amazonka.EC2.Types.UnsuccessfulInstanceCreditSpecificationItemError

Hashable UnsuccessfulItem 
Instance details

Defined in Amazonka.EC2.Types.UnsuccessfulItem

Hashable UnsuccessfulItemError 
Instance details

Defined in Amazonka.EC2.Types.UnsuccessfulItemError

Hashable UsageClassType 
Instance details

Defined in Amazonka.EC2.Types.UsageClassType

Hashable UserBucket 
Instance details

Defined in Amazonka.EC2.Types.UserBucket

Hashable UserBucketDetails 
Instance details

Defined in Amazonka.EC2.Types.UserBucketDetails

Hashable UserData 
Instance details

Defined in Amazonka.EC2.Types.UserData

Methods

hashWithSalt :: Int -> UserData -> Int #

hash :: UserData -> Int #

Hashable UserIdGroupPair 
Instance details

Defined in Amazonka.EC2.Types.UserIdGroupPair

Hashable UserTrustProviderType 
Instance details

Defined in Amazonka.EC2.Types.UserTrustProviderType

Hashable VCpuCountRange 
Instance details

Defined in Amazonka.EC2.Types.VCpuCountRange

Hashable VCpuCountRangeRequest 
Instance details

Defined in Amazonka.EC2.Types.VCpuCountRangeRequest

Hashable VCpuInfo 
Instance details

Defined in Amazonka.EC2.Types.VCpuInfo

Methods

hashWithSalt :: Int -> VCpuInfo -> Int #

hash :: VCpuInfo -> Int #

Hashable ValidationError 
Instance details

Defined in Amazonka.EC2.Types.ValidationError

Hashable ValidationWarning 
Instance details

Defined in Amazonka.EC2.Types.ValidationWarning

Hashable VerifiedAccessEndpoint 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpoint

Hashable VerifiedAccessEndpointAttachmentType 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointAttachmentType

Hashable VerifiedAccessEndpointEniOptions 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointEniOptions

Hashable VerifiedAccessEndpointLoadBalancerOptions 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointLoadBalancerOptions

Hashable VerifiedAccessEndpointProtocol 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointProtocol

Hashable VerifiedAccessEndpointStatus 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointStatus

Hashable VerifiedAccessEndpointStatusCode 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointStatusCode

Hashable VerifiedAccessEndpointType 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointType

Hashable VerifiedAccessGroup 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessGroup

Hashable VerifiedAccessInstance 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessInstance

Hashable VerifiedAccessInstanceLoggingConfiguration 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessInstanceLoggingConfiguration

Hashable VerifiedAccessLogCloudWatchLogsDestination 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogCloudWatchLogsDestination

Hashable VerifiedAccessLogCloudWatchLogsDestinationOptions 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogCloudWatchLogsDestinationOptions

Hashable VerifiedAccessLogDeliveryStatus 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogDeliveryStatus

Hashable VerifiedAccessLogDeliveryStatusCode 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogDeliveryStatusCode

Hashable VerifiedAccessLogKinesisDataFirehoseDestination 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogKinesisDataFirehoseDestination

Hashable VerifiedAccessLogKinesisDataFirehoseDestinationOptions 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogKinesisDataFirehoseDestinationOptions

Hashable VerifiedAccessLogOptions 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogOptions

Hashable VerifiedAccessLogS3Destination 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogS3Destination

Hashable VerifiedAccessLogS3DestinationOptions 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogS3DestinationOptions

Hashable VerifiedAccessLogs 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogs

Hashable VerifiedAccessTrustProvider 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessTrustProvider

Hashable VerifiedAccessTrustProviderCondensed 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessTrustProviderCondensed

Hashable VgwTelemetry 
Instance details

Defined in Amazonka.EC2.Types.VgwTelemetry

Hashable VirtualizationType 
Instance details

Defined in Amazonka.EC2.Types.VirtualizationType

Hashable Volume 
Instance details

Defined in Amazonka.EC2.Types.Volume

Methods

hashWithSalt :: Int -> Volume -> Int #

hash :: Volume -> Int #

Hashable VolumeAttachment 
Instance details

Defined in Amazonka.EC2.Types.VolumeAttachment

Hashable VolumeAttachmentState 
Instance details

Defined in Amazonka.EC2.Types.VolumeAttachmentState

Hashable VolumeAttributeName 
Instance details

Defined in Amazonka.EC2.Types.VolumeAttributeName

Hashable VolumeDetail 
Instance details

Defined in Amazonka.EC2.Types.VolumeDetail

Hashable VolumeModification 
Instance details

Defined in Amazonka.EC2.Types.VolumeModification

Hashable VolumeModificationState 
Instance details

Defined in Amazonka.EC2.Types.VolumeModificationState

Hashable VolumeState 
Instance details

Defined in Amazonka.EC2.Types.VolumeState

Hashable VolumeStatusAction 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusAction

Hashable VolumeStatusAttachmentStatus 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusAttachmentStatus

Hashable VolumeStatusDetails 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusDetails

Hashable VolumeStatusEvent 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusEvent

Hashable VolumeStatusInfo 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusInfo

Hashable VolumeStatusInfoStatus 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusInfoStatus

Hashable VolumeStatusItem 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusItem

Hashable VolumeStatusName 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusName

Hashable VolumeType 
Instance details

Defined in Amazonka.EC2.Types.VolumeType

Hashable Vpc 
Instance details

Defined in Amazonka.EC2.Types.Vpc

Methods

hashWithSalt :: Int -> Vpc -> Int #

hash :: Vpc -> Int #

Hashable VpcAttachment 
Instance details

Defined in Amazonka.EC2.Types.VpcAttachment

Hashable VpcAttributeName 
Instance details

Defined in Amazonka.EC2.Types.VpcAttributeName

Hashable VpcCidrBlockAssociation 
Instance details

Defined in Amazonka.EC2.Types.VpcCidrBlockAssociation

Hashable VpcCidrBlockState 
Instance details

Defined in Amazonka.EC2.Types.VpcCidrBlockState

Hashable VpcCidrBlockStateCode 
Instance details

Defined in Amazonka.EC2.Types.VpcCidrBlockStateCode

Hashable VpcClassicLink 
Instance details

Defined in Amazonka.EC2.Types.VpcClassicLink

Hashable VpcEndpoint 
Instance details

Defined in Amazonka.EC2.Types.VpcEndpoint

Hashable VpcEndpointConnection 
Instance details

Defined in Amazonka.EC2.Types.VpcEndpointConnection

Hashable VpcEndpointType 
Instance details

Defined in Amazonka.EC2.Types.VpcEndpointType

Hashable VpcIpv6CidrBlockAssociation 
Instance details

Defined in Amazonka.EC2.Types.VpcIpv6CidrBlockAssociation

Hashable VpcPeeringConnection 
Instance details

Defined in Amazonka.EC2.Types.VpcPeeringConnection

Hashable VpcPeeringConnectionOptionsDescription 
Instance details

Defined in Amazonka.EC2.Types.VpcPeeringConnectionOptionsDescription

Hashable VpcPeeringConnectionStateReason 
Instance details

Defined in Amazonka.EC2.Types.VpcPeeringConnectionStateReason

Hashable VpcPeeringConnectionStateReasonCode 
Instance details

Defined in Amazonka.EC2.Types.VpcPeeringConnectionStateReasonCode

Hashable VpcPeeringConnectionVpcInfo 
Instance details

Defined in Amazonka.EC2.Types.VpcPeeringConnectionVpcInfo

Hashable VpcState 
Instance details

Defined in Amazonka.EC2.Types.VpcState

Methods

hashWithSalt :: Int -> VpcState -> Int #

hash :: VpcState -> Int #

Hashable VpcTenancy 
Instance details

Defined in Amazonka.EC2.Types.VpcTenancy

Hashable VpnConnection 
Instance details

Defined in Amazonka.EC2.Types.VpnConnection

Hashable VpnConnectionDeviceType 
Instance details

Defined in Amazonka.EC2.Types.VpnConnectionDeviceType

Hashable VpnConnectionOptions 
Instance details

Defined in Amazonka.EC2.Types.VpnConnectionOptions

Hashable VpnConnectionOptionsSpecification 
Instance details

Defined in Amazonka.EC2.Types.VpnConnectionOptionsSpecification

Hashable VpnEcmpSupportValue 
Instance details

Defined in Amazonka.EC2.Types.VpnEcmpSupportValue

Hashable VpnGateway 
Instance details

Defined in Amazonka.EC2.Types.VpnGateway

Hashable VpnProtocol 
Instance details

Defined in Amazonka.EC2.Types.VpnProtocol

Hashable VpnState 
Instance details

Defined in Amazonka.EC2.Types.VpnState

Methods

hashWithSalt :: Int -> VpnState -> Int #

hash :: VpnState -> Int #

Hashable VpnStaticRoute 
Instance details

Defined in Amazonka.EC2.Types.VpnStaticRoute

Hashable VpnStaticRouteSource 
Instance details

Defined in Amazonka.EC2.Types.VpnStaticRouteSource

Hashable VpnTunnelLogOptions 
Instance details

Defined in Amazonka.EC2.Types.VpnTunnelLogOptions

Hashable VpnTunnelLogOptionsSpecification 
Instance details

Defined in Amazonka.EC2.Types.VpnTunnelLogOptionsSpecification

Hashable VpnTunnelOptionsSpecification 
Instance details

Defined in Amazonka.EC2.Types.VpnTunnelOptionsSpecification

Hashable WeekDay 
Instance details

Defined in Amazonka.EC2.Types.WeekDay

Methods

hashWithSalt :: Int -> WeekDay -> Int #

hash :: WeekDay -> Int #

Hashable Invoke 
Instance details

Defined in Amazonka.Lambda.Invoke

Methods

hashWithSalt :: Int -> Invoke -> Int #

hash :: Invoke -> Int #

Hashable AccountLimit 
Instance details

Defined in Amazonka.Lambda.Types.AccountLimit

Hashable AccountUsage 
Instance details

Defined in Amazonka.Lambda.Types.AccountUsage

Hashable AliasConfiguration 
Instance details

Defined in Amazonka.Lambda.Types.AliasConfiguration

Hashable AliasRoutingConfiguration 
Instance details

Defined in Amazonka.Lambda.Types.AliasRoutingConfiguration

Hashable AllowedPublishers 
Instance details

Defined in Amazonka.Lambda.Types.AllowedPublishers

Hashable AmazonManagedKafkaEventSourceConfig 
Instance details

Defined in Amazonka.Lambda.Types.AmazonManagedKafkaEventSourceConfig

Hashable Architecture 
Instance details

Defined in Amazonka.Lambda.Types.Architecture

Hashable CodeSigningConfig 
Instance details

Defined in Amazonka.Lambda.Types.CodeSigningConfig

Hashable CodeSigningPolicies 
Instance details

Defined in Amazonka.Lambda.Types.CodeSigningPolicies

Hashable CodeSigningPolicy 
Instance details

Defined in Amazonka.Lambda.Types.CodeSigningPolicy

Hashable Concurrency 
Instance details

Defined in Amazonka.Lambda.Types.Concurrency

Hashable Cors 
Instance details

Defined in Amazonka.Lambda.Types.Cors

Methods

hashWithSalt :: Int -> Cors -> Int #

hash :: Cors -> Int #

Hashable DeadLetterConfig 
Instance details

Defined in Amazonka.Lambda.Types.DeadLetterConfig

Hashable DestinationConfig 
Instance details

Defined in Amazonka.Lambda.Types.DestinationConfig

Hashable EndPointType 
Instance details

Defined in Amazonka.Lambda.Types.EndPointType

Hashable Environment 
Instance details

Defined in Amazonka.Lambda.Types.Environment

Hashable EnvironmentError 
Instance details

Defined in Amazonka.Lambda.Types.EnvironmentError

Hashable EnvironmentResponse 
Instance details

Defined in Amazonka.Lambda.Types.EnvironmentResponse

Hashable EphemeralStorage 
Instance details

Defined in Amazonka.Lambda.Types.EphemeralStorage

Hashable EventSourceMappingConfiguration 
Instance details

Defined in Amazonka.Lambda.Types.EventSourceMappingConfiguration

Hashable EventSourcePosition 
Instance details

Defined in Amazonka.Lambda.Types.EventSourcePosition

Hashable FileSystemConfig 
Instance details

Defined in Amazonka.Lambda.Types.FileSystemConfig

Hashable Filter 
Instance details

Defined in Amazonka.Lambda.Types.Filter

Methods

hashWithSalt :: Int -> Filter -> Int #

hash :: Filter -> Int #

Hashable FilterCriteria 
Instance details

Defined in Amazonka.Lambda.Types.FilterCriteria

Hashable FunctionCode 
Instance details

Defined in Amazonka.Lambda.Types.FunctionCode

Hashable FunctionCodeLocation 
Instance details

Defined in Amazonka.Lambda.Types.FunctionCodeLocation

Hashable FunctionConfiguration 
Instance details

Defined in Amazonka.Lambda.Types.FunctionConfiguration

Hashable FunctionEventInvokeConfig 
Instance details

Defined in Amazonka.Lambda.Types.FunctionEventInvokeConfig

Hashable FunctionResponseType 
Instance details

Defined in Amazonka.Lambda.Types.FunctionResponseType

Hashable FunctionUrlAuthType 
Instance details

Defined in Amazonka.Lambda.Types.FunctionUrlAuthType

Hashable FunctionUrlConfig 
Instance details

Defined in Amazonka.Lambda.Types.FunctionUrlConfig

Hashable FunctionVersion 
Instance details

Defined in Amazonka.Lambda.Types.FunctionVersion

Hashable GetLayerVersionResponse 
Instance details

Defined in Amazonka.Lambda.Types.GetLayerVersionResponse

Hashable ImageConfig 
Instance details

Defined in Amazonka.Lambda.Types.ImageConfig

Hashable ImageConfigError 
Instance details

Defined in Amazonka.Lambda.Types.ImageConfigError

Hashable ImageConfigResponse 
Instance details

Defined in Amazonka.Lambda.Types.ImageConfigResponse

Hashable InvocationType 
Instance details

Defined in Amazonka.Lambda.Types.InvocationType

Hashable LastUpdateStatus 
Instance details

Defined in Amazonka.Lambda.Types.LastUpdateStatus

Hashable LastUpdateStatusReasonCode 
Instance details

Defined in Amazonka.Lambda.Types.LastUpdateStatusReasonCode

Hashable Layer 
Instance details

Defined in Amazonka.Lambda.Types.Layer

Methods

hashWithSalt :: Int -> Layer -> Int #

hash :: Layer -> Int #

Hashable LayerVersionContentInput 
Instance details

Defined in Amazonka.Lambda.Types.LayerVersionContentInput

Hashable LayerVersionContentOutput 
Instance details

Defined in Amazonka.Lambda.Types.LayerVersionContentOutput

Hashable LayerVersionsListItem 
Instance details

Defined in Amazonka.Lambda.Types.LayerVersionsListItem

Hashable LayersListItem 
Instance details

Defined in Amazonka.Lambda.Types.LayersListItem

Hashable LogType 
Instance details

Defined in Amazonka.Lambda.Types.LogType

Methods

hashWithSalt :: Int -> LogType -> Int #

hash :: LogType -> Int #

Hashable OnFailure 
Instance details

Defined in Amazonka.Lambda.Types.OnFailure

Hashable OnSuccess 
Instance details

Defined in Amazonka.Lambda.Types.OnSuccess

Hashable PackageType 
Instance details

Defined in Amazonka.Lambda.Types.PackageType

Hashable ProvisionedConcurrencyConfigListItem 
Instance details

Defined in Amazonka.Lambda.Types.ProvisionedConcurrencyConfigListItem

Hashable ProvisionedConcurrencyStatusEnum 
Instance details

Defined in Amazonka.Lambda.Types.ProvisionedConcurrencyStatusEnum

Hashable Runtime 
Instance details

Defined in Amazonka.Lambda.Types.Runtime

Methods

hashWithSalt :: Int -> Runtime -> Int #

hash :: Runtime -> Int #

Hashable SelfManagedEventSource 
Instance details

Defined in Amazonka.Lambda.Types.SelfManagedEventSource

Hashable SelfManagedKafkaEventSourceConfig 
Instance details

Defined in Amazonka.Lambda.Types.SelfManagedKafkaEventSourceConfig

Hashable SnapStart 
Instance details

Defined in Amazonka.Lambda.Types.SnapStart

Hashable SnapStartApplyOn 
Instance details

Defined in Amazonka.Lambda.Types.SnapStartApplyOn

Hashable SnapStartOptimizationStatus 
Instance details

Defined in Amazonka.Lambda.Types.SnapStartOptimizationStatus

Hashable SnapStartResponse 
Instance details

Defined in Amazonka.Lambda.Types.SnapStartResponse

Hashable SourceAccessConfiguration 
Instance details

Defined in Amazonka.Lambda.Types.SourceAccessConfiguration

Hashable SourceAccessType 
Instance details

Defined in Amazonka.Lambda.Types.SourceAccessType

Hashable State 
Instance details

Defined in Amazonka.Lambda.Types.State

Methods

hashWithSalt :: Int -> State -> Int #

hash :: State -> Int #

Hashable StateReasonCode 
Instance details

Defined in Amazonka.Lambda.Types.StateReasonCode

Hashable TracingConfig 
Instance details

Defined in Amazonka.Lambda.Types.TracingConfig

Hashable TracingConfigResponse 
Instance details

Defined in Amazonka.Lambda.Types.TracingConfigResponse

Hashable TracingMode 
Instance details

Defined in Amazonka.Lambda.Types.TracingMode

Hashable VpcConfig 
Instance details

Defined in Amazonka.Lambda.Types.VpcConfig

Hashable VpcConfigResponse 
Instance details

Defined in Amazonka.Lambda.Types.VpcConfigResponse

Hashable GetRoleCredentials 
Instance details

Defined in Amazonka.SSO.GetRoleCredentials

Hashable ListAccountRoles 
Instance details

Defined in Amazonka.SSO.ListAccountRoles

Hashable ListAccounts 
Instance details

Defined in Amazonka.SSO.ListAccounts

Hashable Logout 
Instance details

Defined in Amazonka.SSO.Logout

Methods

hashWithSalt :: Int -> Logout -> Int #

hash :: Logout -> Int #

Hashable AccountInfo 
Instance details

Defined in Amazonka.SSO.Types.AccountInfo

Hashable RoleCredentials 
Instance details

Defined in Amazonka.SSO.Types.RoleCredentials

Hashable RoleInfo 
Instance details

Defined in Amazonka.SSO.Types.RoleInfo

Methods

hashWithSalt :: Int -> RoleInfo -> Int #

hash :: RoleInfo -> Int #

Hashable AssumeRole 
Instance details

Defined in Amazonka.STS.AssumeRole

Hashable AssumeRoleWithSAML 
Instance details

Defined in Amazonka.STS.AssumeRoleWithSAML

Hashable AssumeRoleWithWebIdentity 
Instance details

Defined in Amazonka.STS.AssumeRoleWithWebIdentity

Hashable DecodeAuthorizationMessage 
Instance details

Defined in Amazonka.STS.DecodeAuthorizationMessage

Hashable GetAccessKeyInfo 
Instance details

Defined in Amazonka.STS.GetAccessKeyInfo

Hashable GetCallerIdentity 
Instance details

Defined in Amazonka.STS.GetCallerIdentity

Hashable GetFederationToken 
Instance details

Defined in Amazonka.STS.GetFederationToken

Hashable GetSessionToken 
Instance details

Defined in Amazonka.STS.GetSessionToken

Hashable AssumedRoleUser 
Instance details

Defined in Amazonka.STS.Types.AssumedRoleUser

Hashable FederatedUser 
Instance details

Defined in Amazonka.STS.Types.FederatedUser

Hashable PolicyDescriptorType 
Instance details

Defined in Amazonka.STS.Types.PolicyDescriptorType

Hashable Tag 
Instance details

Defined in Amazonka.STS.Types.Tag

Methods

hashWithSalt :: Int -> Tag -> Int #

hash :: Tag -> Int #

Hashable SomeTypeRep 
Instance details

Defined in Data.Hashable.Class

Hashable Unique 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Unique -> Int #

hash :: Unique -> Int #

Hashable Version 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Version -> Int #

hash :: Version -> Int #

Hashable Void 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Void -> Int #

hash :: Void -> Int #

Hashable IntPtr 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> IntPtr -> Int #

hash :: IntPtr -> Int #

Hashable WordPtr 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> WordPtr -> Int #

hash :: WordPtr -> Int #

Hashable ThreadId 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> ThreadId -> Int #

hash :: ThreadId -> Int #

Hashable Fingerprint

Since: hashable-1.3.0.0

Instance details

Defined in Data.Hashable.Class

Hashable Int16 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int16 -> Int #

hash :: Int16 -> Int #

Hashable Int32 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int32 -> Int #

hash :: Int32 -> Int #

Hashable Int64 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int64 -> Int #

hash :: Int64 -> Int #

Hashable Int8 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int8 -> Int #

hash :: Int8 -> Int #

Hashable Word16 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word16 -> Int #

hash :: Word16 -> Int #

Hashable Word32 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word32 -> Int #

hash :: Word32 -> Int #

Hashable Word64 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word64 -> Int #

hash :: Word64 -> Int #

Hashable Word8 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word8 -> Int #

hash :: Word8 -> Int #

Hashable ByteString 
Instance details

Defined in Data.Hashable.Class

Hashable ByteString 
Instance details

Defined in Data.Hashable.Class

Hashable ShortByteString 
Instance details

Defined in Data.Hashable.Class

Hashable IntSet

Since: hashable-1.3.4.0

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> IntSet -> Int #

hash :: IntSet -> Int #

Hashable ByteArray

This instance was available since 1.4.1.0 only for GHC-9.4+

Since: hashable-1.4.2.0

Instance details

Defined in Data.Hashable.Class

Hashable BigNat 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> BigNat -> Int #

hash :: BigNat -> Int #

Hashable Ordering 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Ordering -> Int #

hash :: Ordering -> Int #

Hashable Scientific

A hash can be safely calculated from a Scientific. No magnitude 10^e is calculated so there's no risk of a blowup in space or time when hashing scientific numbers coming from untrusted sources.

>>> import Data.Hashable (hash)
>>> let x = scientific 1 2
>>> let y = scientific 100 0
>>> (x == y, hash x == hash y)
(True,True)
Instance details

Defined in Data.Scientific

Hashable Text 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Text -> Int #

hash :: Text -> Int #

Hashable Text 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Text -> Int #

hash :: Text -> Int #

Hashable ShortText 
Instance details

Defined in Data.Text.Short.Internal

Hashable UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

hashWithSalt :: Int -> UUID -> Int #

hash :: UUID -> Int #

Hashable Integer 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Integer -> Int #

hash :: Integer -> Int #

Hashable Natural 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Natural -> Int #

hash :: Natural -> Int #

Hashable () 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> () -> Int #

hash :: () -> Int #

Hashable Bool 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Bool -> Int #

hash :: Bool -> Int #

Hashable Char 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Char -> Int #

hash :: Char -> Int #

Hashable Double

Note: prior to hashable-1.3.0.0, hash 0.0 /= hash (-0.0)

The hash of NaN is not well defined.

Since: hashable-1.3.0.0

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Double -> Int #

hash :: Double -> Int #

Hashable Float

Note: prior to hashable-1.3.0.0, hash 0.0 /= hash (-0.0)

The hash of NaN is not well defined.

Since: hashable-1.3.0.0

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Float -> Int #

hash :: Float -> Int #

Hashable Int 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int -> Int #

hash :: Int -> Int #

Hashable Word 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word -> Int #

hash :: Word -> Int #

Hashable v => Hashable (KeyMap v) 
Instance details

Defined in Data.Aeson.KeyMap

Methods

hashWithSalt :: Int -> KeyMap v -> Int #

hash :: KeyMap v -> Int #

Hashable a => Hashable (Sensitive a) 
Instance details

Defined in Amazonka.Data.Sensitive

Methods

hashWithSalt :: Int -> Sensitive a -> Int #

hash :: Sensitive a -> Int #

Hashable (Time a) 
Instance details

Defined in Amazonka.Data.Time

Methods

hashWithSalt :: Int -> Time a -> Int #

hash :: Time a -> Int #

Hashable (Async a) 
Instance details

Defined in Control.Concurrent.Async

Methods

hashWithSalt :: Int -> Async a -> Int #

hash :: Async a -> Int #

Hashable a => Hashable (Complex a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Complex a -> Int #

hash :: Complex a -> Int #

Hashable a => Hashable (Identity a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Identity a -> Int #

hash :: Identity a -> Int #

Hashable a => Hashable (First a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> First a -> Int #

hash :: First a -> Int #

Hashable a => Hashable (Last a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Last a -> Int #

hash :: Last a -> Int #

Hashable a => Hashable (Max a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Max a -> Int #

hash :: Max a -> Int #

Hashable a => Hashable (Min a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Min a -> Int #

hash :: Min a -> Int #

Hashable a => Hashable (WrappedMonoid a) 
Instance details

Defined in Data.Hashable.Class

Hashable (FunPtr a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> FunPtr a -> Int #

hash :: FunPtr a -> Int #

Hashable (Ptr a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Ptr a -> Int #

hash :: Ptr a -> Int #

Hashable a => Hashable (Ratio a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Ratio a -> Int #

hash :: Ratio a -> Int #

Hashable (StableName a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> StableName a -> Int #

hash :: StableName a -> Int #

Hashable v => Hashable (IntMap v)

Since: hashable-1.3.4.0

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> IntMap v -> Int #

hash :: IntMap v -> Int #

Hashable v => Hashable (Seq v)

Since: hashable-1.3.4.0

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Seq v -> Int #

hash :: Seq v -> Int #

Hashable v => Hashable (Set v)

Since: hashable-1.3.4.0

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Set v -> Int #

hash :: Set v -> Int #

Hashable v => Hashable (Tree v)

Since: hashable-1.3.4.0

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Tree v -> Int #

hash :: Tree v -> Int #

Hashable1 f => Hashable (Fix f) 
Instance details

Defined in Data.Fix

Methods

hashWithSalt :: Int -> Fix f -> Int #

hash :: Fix f -> Int #

Eq a => Hashable (Hashed a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Hashed a -> Int #

hash :: Hashed a -> Int #

Hashable a => Hashable (Maybe a) 
Instance details

Defined in Data.Strict.Maybe

Methods

hashWithSalt :: Int -> Maybe a -> Int #

hash :: Maybe a -> Int #

Hashable a => Hashable (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Methods

hashWithSalt :: Int -> HashSet a -> Int #

hash :: HashSet a -> Int #

Hashable a => Hashable (NonEmpty a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> NonEmpty a -> Int #

hash :: NonEmpty a -> Int #

Hashable a => Hashable (Maybe a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Maybe a -> Int #

hash :: Maybe a -> Int #

Hashable a => Hashable (a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> (a) -> Int #

hash :: (a) -> Int #

Hashable a => Hashable [a] 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> [a] -> Int #

hash :: [a] -> Int #

(Hashable a, Hashable b) => Hashable (Either a b) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Either a b -> Int #

hash :: Either a b -> Int #

Hashable (Fixed a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Fixed a -> Int #

hash :: Fixed a -> Int #

Hashable (Proxy a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Proxy a -> Int #

hash :: Proxy a -> Int #

Hashable a => Hashable (Arg a b)

Note: Prior to hashable-1.3.0.0 the hash computation included the second argument of Arg which wasn't consistent with its Eq instance.

Since: hashable-1.3.0.0

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Arg a b -> Int #

hash :: Arg a b -> Int #

Hashable (TypeRep a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> TypeRep a -> Int #

hash :: TypeRep a -> Int #

(Hashable k, Hashable v) => Hashable (Map k v)

Since: hashable-1.3.4.0

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Map k v -> Int #

hash :: Map k v -> Int #

(Hashable a, Hashable b) => Hashable (Either a b) 
Instance details

Defined in Data.Strict.Either

Methods

hashWithSalt :: Int -> Either a b -> Int #

hash :: Either a b -> Int #

(Hashable a, Hashable b) => Hashable (These a b) 
Instance details

Defined in Data.Strict.These

Methods

hashWithSalt :: Int -> These a b -> Int #

hash :: These a b -> Int #

(Hashable a, Hashable b) => Hashable (Pair a b) 
Instance details

Defined in Data.Strict.Tuple

Methods

hashWithSalt :: Int -> Pair a b -> Int #

hash :: Pair a b -> Int #

(Hashable a, Hashable b) => Hashable (These a b) 
Instance details

Defined in Data.These

Methods

hashWithSalt :: Int -> These a b -> Int #

hash :: These a b -> Int #

(Hashable k, Hashable v) => Hashable (HashMap k v) 
Instance details

Defined in Data.HashMap.Internal

Methods

hashWithSalt :: Int -> HashMap k v -> Int #

hash :: HashMap k v -> Int #

(Hashable a1, Hashable a2) => Hashable (a1, a2) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> (a1, a2) -> Int #

hash :: (a1, a2) -> Int #

Hashable a => Hashable (Const a b) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Const a b -> Int #

hash :: Const a b -> Int #

(Hashable a1, Hashable a2, Hashable a3) => Hashable (a1, a2, a3) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> (a1, a2, a3) -> Int #

hash :: (a1, a2, a3) -> Int #

(Hashable1 f, Hashable1 g, Hashable a) => Hashable (Product f g a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Product f g a -> Int #

hash :: Product f g a -> Int #

(Hashable1 f, Hashable1 g, Hashable a) => Hashable (Sum f g a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Sum f g a -> Int #

hash :: Sum f g a -> Int #

(Hashable a1, Hashable a2, Hashable a3, Hashable a4) => Hashable (a1, a2, a3, a4) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> (a1, a2, a3, a4) -> Int #

hash :: (a1, a2, a3, a4) -> Int #

(Hashable1 f, Hashable1 g, Hashable a) => Hashable (Compose f g a)

In general, hash (Compose x) ≠ hash x. However, hashWithSalt satisfies its variant of this equivalence.

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Compose f g a -> Int #

hash :: Compose f g a -> Int #

(Hashable a1, Hashable a2, Hashable a3, Hashable a4, Hashable a5) => Hashable (a1, a2, a3, a4, a5) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> (a1, a2, a3, a4, a5) -> Int #

hash :: (a1, a2, a3, a4, a5) -> Int #

(Hashable a1, Hashable a2, Hashable a3, Hashable a4, Hashable a5, Hashable a6) => Hashable (a1, a2, a3, a4, a5, a6) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> (a1, a2, a3, a4, a5, a6) -> Int #

hash :: (a1, a2, a3, a4, a5, a6) -> Int #

(Hashable a1, Hashable a2, Hashable a3, Hashable a4, Hashable a5, Hashable a6, Hashable a7) => Hashable (a1, a2, a3, a4, a5, a6, a7) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> (a1, a2, a3, a4, a5, a6, a7) -> Int #

hash :: (a1, a2, a3, a4, a5, a6, a7) -> Int #

(<$>) :: Functor f => (a -> b) -> f a -> f b infixl 4 #

An infix synonym for fmap.

The name of this operator is an allusion to $. Note the similarities between their types:

 ($)  ::              (a -> b) ->   a ->   b
(<$>) :: Functor f => (a -> b) -> f a -> f b

Whereas $ is function application, <$> is function application lifted over a Functor.

Examples

Expand

Convert from a Maybe Int to a Maybe String using show:

>>> show <$> Nothing
Nothing
>>> show <$> Just 3
Just "3"

Convert from an Either Int Int to an Either Int String using show:

>>> show <$> Left 17
Left 17
>>> show <$> Right 17
Right "17"

Double each element of a list:

>>> (*2) <$> [1,2,3]
[2,4,6]

Apply even to the second element of a pair:

>>> even <$> (2,2)
(2,True)

const :: a -> b -> a #

const x is a unary function which evaluates to x for all inputs.

>>> const 42 "hello"
42
>>> map (const 42) [0..3]
[42,42,42,42]

(.) :: (b -> c) -> (a -> b) -> a -> c infixr 9 #

Function composition.

data ByteString #

A space-efficient representation of a Word8 vector, supporting many efficient operations.

A ByteString contains 8-bit bytes, or by using the operations from Data.ByteString.Char8 it can be interpreted as containing 8-bit characters.

Instances

Instances details
ToBody ByteString 
Instance details

Defined in Amazonka.Data.Body

ToHashedBody ByteString 
Instance details

Defined in Amazonka.Data.Body

ToLog ByteString 
Instance details

Defined in Amazonka.Data.Log

ToPath ByteString 
Instance details

Defined in Amazonka.Data.Path

ToQuery ByteString 
Instance details

Defined in Amazonka.Data.Query

FromText ByteString 
Instance details

Defined in Amazonka.Data.Text

ToText ByteString 
Instance details

Defined in Amazonka.Data.Text

Methods

toText :: ByteString -> Text #

Chunk ByteString 
Instance details

Defined in Data.Attoparsec.Internal.Types

Associated Types

type ChunkElem ByteString #

Data ByteString 
Instance details

Defined in Data.ByteString.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ByteString -> c ByteString #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ByteString #

toConstr :: ByteString -> Constr #

dataTypeOf :: ByteString -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ByteString) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ByteString) #

gmapT :: (forall b. Data b => b -> b) -> ByteString -> ByteString #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ByteString -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ByteString -> r #

gmapQ :: (forall d. Data d => d -> u) -> ByteString -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ByteString -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ByteString -> m ByteString #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ByteString -> m ByteString #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ByteString -> m ByteString #

IsString ByteString

Beware: fromString truncates multi-byte characters to octets. e.g. "枯朶に烏のとまりけり秋の暮" becomes �6k�nh~�Q��n�

Instance details

Defined in Data.ByteString.Internal

Monoid ByteString 
Instance details

Defined in Data.ByteString.Internal

Semigroup ByteString 
Instance details

Defined in Data.ByteString.Internal

IsList ByteString

Since: bytestring-0.10.12.0

Instance details

Defined in Data.ByteString.Internal

Associated Types

type Item ByteString #

Read ByteString 
Instance details

Defined in Data.ByteString.Internal

Show ByteString 
Instance details

Defined in Data.ByteString.Internal

NFData ByteString 
Instance details

Defined in Data.ByteString.Internal

Methods

rnf :: ByteString -> () #

ToLogStr ByteString 
Instance details

Defined in System.Log.FastLogger.LogStr

Eq ByteString 
Instance details

Defined in Data.ByteString.Internal

Ord ByteString 
Instance details

Defined in Data.ByteString.Internal

Hashable ByteString 
Instance details

Defined in Data.Hashable.Class

Ixed ByteString 
Instance details

Defined in Control.Lens.At

AsJSON ByteString 
Instance details

Defined in Data.Aeson.Lens

Methods

_JSON :: (FromJSON a, ToJSON b) => Prism ByteString ByteString a b #

AsNumber ByteString 
Instance details

Defined in Data.Aeson.Lens

AsValue ByteString 
Instance details

Defined in Data.Aeson.Lens

IsKey ByteString

This instance assumes that you are dealing with UTF-8–encoded ByteStrings, as this is the encoding that RFC 8259 requires JSON values to use. As such, this is not a full Iso, since non–UTF-8–encoded ByteStrings will not roundtrip:

>>> let str = view _Key ("\255" :: Strict.ByteString)
>>> str
"\65533"
>>> view (from _Key) str :: Strict.ByteString
"\239\191\189"
Instance details

Defined in Data.Aeson.Lens

GrowingAppend ByteString 
Instance details

Defined in Data.MonoTraversable

MonoFoldable ByteString 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element ByteString -> m) -> ByteString -> m #

ofoldr :: (Element ByteString -> b -> b) -> b -> ByteString -> b #

ofoldl' :: (a -> Element ByteString -> a) -> a -> ByteString -> a #

otoList :: ByteString -> [Element ByteString] #

oall :: (Element ByteString -> Bool) -> ByteString -> Bool #

oany :: (Element ByteString -> Bool) -> ByteString -> Bool #

onull :: ByteString -> Bool #

olength :: ByteString -> Int #

olength64 :: ByteString -> Int64 #

ocompareLength :: Integral i => ByteString -> i -> Ordering #

otraverse_ :: Applicative f => (Element ByteString -> f b) -> ByteString -> f () #

ofor_ :: Applicative f => ByteString -> (Element ByteString -> f b) -> f () #

omapM_ :: Applicative m => (Element ByteString -> m ()) -> ByteString -> m () #

oforM_ :: Applicative m => ByteString -> (Element ByteString -> m ()) -> m () #

ofoldlM :: Monad m => (a -> Element ByteString -> m a) -> a -> ByteString -> m a #

ofoldMap1Ex :: Semigroup m => (Element ByteString -> m) -> ByteString -> m #

ofoldr1Ex :: (Element ByteString -> Element ByteString -> Element ByteString) -> ByteString -> Element ByteString #

ofoldl1Ex' :: (Element ByteString -> Element ByteString -> Element ByteString) -> ByteString -> Element ByteString #

headEx :: ByteString -> Element ByteString #

lastEx :: ByteString -> Element ByteString #

unsafeHead :: ByteString -> Element ByteString #

unsafeLast :: ByteString -> Element ByteString #

maximumByEx :: (Element ByteString -> Element ByteString -> Ordering) -> ByteString -> Element ByteString #

minimumByEx :: (Element ByteString -> Element ByteString -> Ordering) -> ByteString -> Element ByteString #

oelem :: Element ByteString -> ByteString -> Bool #

onotElem :: Element ByteString -> ByteString -> Bool #

MonoFunctor ByteString 
Instance details

Defined in Data.MonoTraversable

MonoPointed ByteString 
Instance details

Defined in Data.MonoTraversable

MonoTraversable ByteString 
Instance details

Defined in Data.MonoTraversable

IsSequence ByteString 
Instance details

Defined in Data.Sequences

Methods

fromList :: [Element ByteString] -> ByteString #

lengthIndex :: ByteString -> Index ByteString #

break :: (Element ByteString -> Bool) -> ByteString -> (ByteString, ByteString) #

span :: (Element ByteString -> Bool) -> ByteString -> (ByteString, ByteString) #

dropWhile :: (Element ByteString -> Bool) -> ByteString -> ByteString #

takeWhile :: (Element ByteString -> Bool) -> ByteString -> ByteString #

splitAt :: Index ByteString -> ByteString -> (ByteString, ByteString) #

unsafeSplitAt :: Index ByteString -> ByteString -> (ByteString, ByteString) #

take :: Index ByteString -> ByteString -> ByteString #

unsafeTake :: Index ByteString -> ByteString -> ByteString #

drop :: Index ByteString -> ByteString -> ByteString #

unsafeDrop :: Index ByteString -> ByteString -> ByteString #

dropEnd :: Index ByteString -> ByteString -> ByteString #

partition :: (Element ByteString -> Bool) -> ByteString -> (ByteString, ByteString) #

uncons :: ByteString -> Maybe (Element ByteString, ByteString) #

unsnoc :: ByteString -> Maybe (ByteString, Element ByteString) #

filter :: (Element ByteString -> Bool) -> ByteString -> ByteString #

filterM :: Monad m => (Element ByteString -> m Bool) -> ByteString -> m ByteString #

replicate :: Index ByteString -> Element ByteString -> ByteString #

replicateM :: Monad m => Index ByteString -> m (Element ByteString) -> m ByteString #

groupBy :: (Element ByteString -> Element ByteString -> Bool) -> ByteString -> [ByteString] #

groupAllOn :: Eq b => (Element ByteString -> b) -> ByteString -> [ByteString] #

subsequences :: ByteString -> [ByteString] #

permutations :: ByteString -> [ByteString] #

tailEx :: ByteString -> ByteString #

tailMay :: ByteString -> Maybe ByteString #

initEx :: ByteString -> ByteString #

initMay :: ByteString -> Maybe ByteString #

unsafeTail :: ByteString -> ByteString #

unsafeInit :: ByteString -> ByteString #

index :: ByteString -> Index ByteString -> Maybe (Element ByteString) #

indexEx :: ByteString -> Index ByteString -> Element ByteString #

unsafeIndex :: ByteString -> Index ByteString -> Element ByteString #

splitWhen :: (Element ByteString -> Bool) -> ByteString -> [ByteString] #

SemiSequence ByteString 
Instance details

Defined in Data.Sequences

Associated Types

type Index ByteString #

LazySequence ByteString ByteString 
Instance details

Defined in Data.Sequences

Utf8 Text ByteString 
Instance details

Defined in Data.Sequences

Lift ByteString

Since: bytestring-0.11.2.0

Instance details

Defined in Data.ByteString.Internal

Methods

lift :: Quote m => ByteString -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => ByteString -> Code m ByteString #

ToLog [Header] 
Instance details

Defined in Amazonka.Data.Log

type ChunkElem ByteString 
Instance details

Defined in Data.Attoparsec.Internal.Types

type State ByteString 
Instance details

Defined in Data.Attoparsec.Internal.Types

type State ByteString = Buffer
type Item ByteString 
Instance details

Defined in Data.ByteString.Internal

type Index ByteString 
Instance details

Defined in Control.Lens.At

type IxValue ByteString 
Instance details

Defined in Control.Lens.At

type Element ByteString 
Instance details

Defined in Data.MonoTraversable

type Index ByteString 
Instance details

Defined in Data.Sequences

data Text #

A space efficient, packed, unboxed Unicode text type.

Instances

Instances details
FromJSON Text 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Text 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Text 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Text 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToBody Text 
Instance details

Defined in Amazonka.Data.Body

Methods

toBody :: Text -> RequestBody #

ToHashedBody Text 
Instance details

Defined in Amazonka.Data.Body

Methods

toHashed :: Text -> HashedBody #

ToLog Text 
Instance details

Defined in Amazonka.Data.Log

ToPath Text 
Instance details

Defined in Amazonka.Data.Path

Methods

toPath :: Text -> ByteString #

ToQuery Text 
Instance details

Defined in Amazonka.Data.Query

Methods

toQuery :: Text -> QueryString #

FromText Text 
Instance details

Defined in Amazonka.Data.Text

ToText Text 
Instance details

Defined in Amazonka.Data.Text

Methods

toText :: Text -> Text #

Chunk Text 
Instance details

Defined in Data.Attoparsec.Internal.Types

Associated Types

type ChunkElem Text #

ToLogStr Text 
Instance details

Defined in System.Log.FastLogger.LogStr

Methods

toLogStr :: Text -> LogStr #

Hashable Text 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Text -> Int #

hash :: Text -> Int #

Ixed Text 
Instance details

Defined in Control.Lens.At

AsJSON Text 
Instance details

Defined in Data.Aeson.Lens

Methods

_JSON :: (FromJSON a, ToJSON b) => Prism Text Text a b #

AsNumber Text 
Instance details

Defined in Data.Aeson.Lens

AsValue Text 
Instance details

Defined in Data.Aeson.Lens

IsKey Text 
Instance details

Defined in Data.Aeson.Lens

Methods

_Key :: Iso' Text Key #

GrowingAppend Text 
Instance details

Defined in Data.MonoTraversable

MonoFoldable Text 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element Text -> m) -> Text -> m #

ofoldr :: (Element Text -> b -> b) -> b -> Text -> b #

ofoldl' :: (a -> Element Text -> a) -> a -> Text -> a #

otoList :: Text -> [Element Text] #

oall :: (Element Text -> Bool) -> Text -> Bool #

oany :: (Element Text -> Bool) -> Text -> Bool #

onull :: Text -> Bool #

olength :: Text -> Int #

olength64 :: Text -> Int64 #

ocompareLength :: Integral i => Text -> i -> Ordering #

otraverse_ :: Applicative f => (Element Text -> f b) -> Text -> f () #

ofor_ :: Applicative f => Text -> (Element Text -> f b) -> f () #

omapM_ :: Applicative m => (Element Text -> m ()) -> Text -> m () #

oforM_ :: Applicative m => Text -> (Element Text -> m ()) -> m () #

ofoldlM :: Monad m => (a -> Element Text -> m a) -> a -> Text -> m a #

ofoldMap1Ex :: Semigroup m => (Element Text -> m) -> Text -> m #

ofoldr1Ex :: (Element Text -> Element Text -> Element Text) -> Text -> Element Text #

ofoldl1Ex' :: (Element Text -> Element Text -> Element Text) -> Text -> Element Text #

headEx :: Text -> Element Text #

lastEx :: Text -> Element Text #

unsafeHead :: Text -> Element Text #

unsafeLast :: Text -> Element Text #

maximumByEx :: (Element Text -> Element Text -> Ordering) -> Text -> Element Text #

minimumByEx :: (Element Text -> Element Text -> Ordering) -> Text -> Element Text #

oelem :: Element Text -> Text -> Bool #

onotElem :: Element Text -> Text -> Bool #

MonoFunctor Text 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element Text -> Element Text) -> Text -> Text #

MonoPointed Text 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element Text -> Text #

MonoTraversable Text 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element Text -> f (Element Text)) -> Text -> f Text #

omapM :: Applicative m => (Element Text -> m (Element Text)) -> Text -> m Text #

IsSequence Text 
Instance details

Defined in Data.Sequences

Methods

fromList :: [Element Text] -> Text #

lengthIndex :: Text -> Index Text #

break :: (Element Text -> Bool) -> Text -> (Text, Text) #

span :: (Element Text -> Bool) -> Text -> (Text, Text) #

dropWhile :: (Element Text -> Bool) -> Text -> Text #

takeWhile :: (Element Text -> Bool) -> Text -> Text #

splitAt :: Index Text -> Text -> (Text, Text) #

unsafeSplitAt :: Index Text -> Text -> (Text, Text) #

take :: Index Text -> Text -> Text #

unsafeTake :: Index Text -> Text -> Text #

drop :: Index Text -> Text -> Text #

unsafeDrop :: Index Text -> Text -> Text #

dropEnd :: Index Text -> Text -> Text #

partition :: (Element Text -> Bool) -> Text -> (Text, Text) #

uncons :: Text -> Maybe (Element Text, Text) #

unsnoc :: Text -> Maybe (Text, Element Text) #

filter :: (Element Text -> Bool) -> Text -> Text #

filterM :: Monad m => (Element Text -> m Bool) -> Text -> m Text #

replicate :: Index Text -> Element Text -> Text #

replicateM :: Monad m => Index Text -> m (Element Text) -> m Text #

groupBy :: (Element Text -> Element Text -> Bool) -> Text -> [Text] #

groupAllOn :: Eq b => (Element Text -> b) -> Text -> [Text] #

subsequences :: Text -> [Text] #

permutations :: Text -> [Text] #

tailEx :: Text -> Text #

tailMay :: Text -> Maybe Text #

initEx :: Text -> Text #

initMay :: Text -> Maybe Text #

unsafeTail :: Text -> Text #

unsafeInit :: Text -> Text #

index :: Text -> Index Text -> Maybe (Element Text) #

indexEx :: Text -> Index Text -> Element Text #

unsafeIndex :: Text -> Index Text -> Element Text #

splitWhen :: (Element Text -> Bool) -> Text -> [Text] #

SemiSequence Text 
Instance details

Defined in Data.Sequences

Associated Types

type Index Text #

Textual Text 
Instance details

Defined in Data.Sequences

Methods

words :: Text -> [Text] #

unwords :: (Element seq ~ Text, MonoFoldable seq) => seq -> Text #

lines :: Text -> [Text] #

unlines :: (Element seq ~ Text, MonoFoldable seq) => seq -> Text #

toLower :: Text -> Text #

toUpper :: Text -> Text #

toCaseFold :: Text -> Text #

breakWord :: Text -> (Text, Text) #

breakLine :: Text -> (Text, Text) #

Pretty Text

Automatically converts all newlines to line.

>>> pretty ("hello\nworld" :: Text)
hello
world

Note that line can be undone by group:

>>> group (pretty ("hello\nworld" :: Text))
hello world

Manually use hardline if you definitely want newlines.

Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Text -> Doc ann #

prettyList :: [Text] -> Doc ann #

Display Text

Since: rio-0.1.0.0

Instance details

Defined in RIO.Prelude.Display

LazySequence Text Text 
Instance details

Defined in Data.Sequences

Utf8 Text ByteString 
Instance details

Defined in Data.Sequences

type ChunkElem Text 
Instance details

Defined in Data.Attoparsec.Internal.Types

type State Text 
Instance details

Defined in Data.Attoparsec.Internal.Types

type State Text = Buffer
type Item Text 
Instance details

Defined in Data.Text

type Item Text = Char
type Index Text 
Instance details

Defined in Control.Lens.At

type Index Text = Int
type IxValue Text 
Instance details

Defined in Control.Lens.At

type Element Text 
Instance details

Defined in Data.MonoTraversable

type Index Text 
Instance details

Defined in Data.Sequences

type Index Text = Int

data Map k a #

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

Instances details
Bifoldable Map

Since: containers-0.6.3.1

Instance details

Defined in Data.Map.Internal

Methods

bifold :: Monoid m => Map m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> Map a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> Map a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> Map a b -> c #

Eq2 Map

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

liftEq2 :: (a -> b -> Bool) -> (c -> d -> Bool) -> Map a c -> Map b d -> Bool #

Ord2 Map

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

liftCompare2 :: (a -> b -> Ordering) -> (c -> d -> Ordering) -> Map a c -> Map b d -> Ordering #

Show2 Map

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

liftShowsPrec2 :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> (Int -> b -> ShowS) -> ([b] -> ShowS) -> Int -> Map a b -> ShowS #

liftShowList2 :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> (Int -> b -> ShowS) -> ([b] -> ShowS) -> [Map a b] -> ShowS #

Hashable2 Map

Since: hashable-1.3.4.0

Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt2 :: (Int -> a -> Int) -> (Int -> b -> Int) -> Int -> Map a b -> Int #

(Ord k, Arbitrary k) => Arbitrary1 (Map k) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitrary :: Gen a -> Gen (Map k a) #

liftShrink :: (a -> [a]) -> Map k a -> [Map k a] #

(FromJSONKey k, Ord k) => FromJSON1 (Map k) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (Map k a) #

liftParseJSONList :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [Map k a] #

ToJSONKey k => ToJSON1 (Map k) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Value) -> ([a] -> Value) -> Map k a -> Value #

liftToJSONList :: (a -> Value) -> ([a] -> Value) -> [Map k a] -> Value #

liftToEncoding :: (a -> Encoding) -> ([a] -> Encoding) -> Map k a -> Encoding #

liftToEncodingList :: (a -> Encoding) -> ([a] -> Encoding) -> [Map k a] -> Encoding #

Foldable (Map k)

Folds in order of increasing key.

Instance details

Defined in Data.Map.Internal

Methods

fold :: Monoid m => Map k m -> m #

foldMap :: Monoid m => (a -> m) -> Map k a -> m #

foldMap' :: Monoid m => (a -> m) -> Map k a -> m #

foldr :: (a -> b -> b) -> b -> Map k a -> b #

foldr' :: (a -> b -> b) -> b -> Map k a -> b #

foldl :: (b -> a -> b) -> b -> Map k a -> b #

foldl' :: (b -> a -> b) -> b -> Map k a -> b #

foldr1 :: (a -> a -> a) -> Map k a -> a #

foldl1 :: (a -> a -> a) -> Map k a -> a #

toList :: Map k a -> [a] #

null :: Map k a -> Bool #

length :: Map k a -> Int #

elem :: Eq a => a -> Map k a -> Bool #

maximum :: Ord a => Map k a -> a #

minimum :: Ord a => Map k a -> a #

sum :: Num a => Map k a -> a #

product :: Num a => Map k a -> a #

Eq k => Eq1 (Map k)

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

liftEq :: (a -> b -> Bool) -> Map k a -> Map k b -> Bool #

Ord k => Ord1 (Map k)

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

liftCompare :: (a -> b -> Ordering) -> Map k a -> Map k b -> Ordering #

(Ord k, Read k) => Read1 (Map k)

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (Map k a) #

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [Map k a] #

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (Map k a) #

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [Map k a] #

Show k => Show1 (Map k)

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Map k a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Map k a] -> ShowS #

Traversable (Map k)

Traverses in order of increasing key.

Instance details

Defined in Data.Map.Internal

Methods

traverse :: Applicative f => (a -> f b) -> Map k a -> f (Map k b) #

sequenceA :: Applicative f => Map k (f a) -> f (Map k a) #

mapM :: Monad m => (a -> m b) -> Map k a -> m (Map k b) #

sequence :: Monad m => Map k (m a) -> m (Map k a) #

Functor (Map k) 
Instance details

Defined in Data.Map.Internal

Methods

fmap :: (a -> b) -> Map k a -> Map k b #

(<$) :: a -> Map k b -> Map k a #

Hashable k => Hashable1 (Map k)

Since: hashable-1.3.4.0

Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> Map k a -> Int #

(Ord k, Arbitrary k, Arbitrary v) => Arbitrary (Map k v) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (Map k v) #

shrink :: Map k v -> [Map k v] #

(CoArbitrary k, CoArbitrary v) => CoArbitrary (Map k v) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Map k v -> Gen b -> Gen b #

(Ord a, Function a, Function b) => Function (Map a b) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Map a b -> b0) -> Map a b :-> b0 #

(FromJSONKey k, Ord k, FromJSON v) => FromJSON (Map k v) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Map k v) #

parseJSONList :: Value -> Parser [Map k v] #

(ToJSON v, ToJSONKey k) => ToJSON (Map k v) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Map k v -> Value #

toEncoding :: Map k v -> Encoding #

toJSONList :: [Map k v] -> Value #

toEncodingList :: [Map k v] -> Encoding #

(Data k, Data a, Ord k) => Data (Map k a) 
Instance details

Defined in Data.Map.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Map k a -> c (Map k a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Map k a) #

toConstr :: Map k a -> Constr #

dataTypeOf :: Map k a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Map k a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Map k a)) #

gmapT :: (forall b. Data b => b -> b) -> Map k a -> Map k a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Map k a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Map k a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Map k a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Map k a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Map k a -> m (Map k a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Map k a -> m (Map k a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Map k a -> m (Map k a) #

Ord k => Monoid (Map k v) 
Instance details

Defined in Data.Map.Internal

Methods

mempty :: Map k v #

mappend :: Map k v -> Map k v -> Map k v #

mconcat :: [Map k v] -> Map k v #

Ord k => Semigroup (Map k v) 
Instance details

Defined in Data.Map.Internal

Methods

(<>) :: Map k v -> Map k v -> Map k v #

sconcat :: NonEmpty (Map k v) -> Map k v #

stimes :: Integral b => b -> Map k v -> Map k v #

Ord k => IsList (Map k v)

Since: containers-0.5.6.2

Instance details

Defined in Data.Map.Internal

Associated Types

type Item (Map k v) #

Methods

fromList :: [Item (Map k v)] -> Map k v #

fromListN :: Int -> [Item (Map k v)] -> Map k v #

toList :: Map k v -> [Item (Map k v)] #

(Ord k, Read k, Read e) => Read (Map k e) 
Instance details

Defined in Data.Map.Internal

Methods

readsPrec :: Int -> ReadS (Map k e) #

readList :: ReadS [Map k e] #

readPrec :: ReadPrec (Map k e) #

readListPrec :: ReadPrec [Map k e] #

(Show k, Show a) => Show (Map k a) 
Instance details

Defined in Data.Map.Internal

Methods

showsPrec :: Int -> Map k a -> ShowS #

show :: Map k a -> String #

showList :: [Map k a] -> ShowS #

(NFData k, NFData a) => NFData (Map k a) 
Instance details

Defined in Data.Map.Internal

Methods

rnf :: Map k a -> () #

(Eq k, Eq a) => Eq (Map k a) 
Instance details

Defined in Data.Map.Internal

Methods

(==) :: Map k a -> Map k a -> Bool #

(/=) :: Map k a -> Map k a -> Bool #

(Ord k, Ord v) => Ord (Map k v) 
Instance details

Defined in Data.Map.Internal

Methods

compare :: Map k v -> Map k v -> Ordering #

(<) :: Map k v -> Map k v -> Bool #

(<=) :: Map k v -> Map k v -> Bool #

(>) :: Map k v -> Map k v -> Bool #

(>=) :: Map k v -> Map k v -> Bool #

max :: Map k v -> Map k v -> Map k v #

min :: Map k v -> Map k v -> Map k v #

(Hashable k, Hashable v) => Hashable (Map k v)

Since: hashable-1.3.4.0

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Map k v -> Int #

hash :: Map k v -> Int #

Ord k => At (Map k a) 
Instance details

Defined in Control.Lens.At

Methods

at :: Index (Map k a) -> Lens' (Map k a) (Maybe (IxValue (Map k a))) #

Ord k => Ixed (Map k a) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (Map k a) -> Traversal' (Map k a) (IxValue (Map k a)) #

Ord k => Wrapped (Map k a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Map k a) #

Methods

_Wrapped' :: Iso' (Map k a) (Unwrapped (Map k a)) #

Ord k => GrowingAppend (Map k v) 
Instance details

Defined in Data.MonoTraversable

MonoFoldable (Map k v) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (Map k v) -> m) -> Map k v -> m #

ofoldr :: (Element (Map k v) -> b -> b) -> b -> Map k v -> b #

ofoldl' :: (a -> Element (Map k v) -> a) -> a -> Map k v -> a #

otoList :: Map k v -> [Element (Map k v)] #

oall :: (Element (Map k v) -> Bool) -> Map k v -> Bool #

oany :: (Element (Map k v) -> Bool) -> Map k v -> Bool #

onull :: Map k v -> Bool #

olength :: Map k v -> Int #

olength64 :: Map k v -> Int64 #

ocompareLength :: Integral i => Map k v -> i -> Ordering #

otraverse_ :: Applicative f => (Element (Map k v) -> f b) -> Map k v -> f () #

ofor_ :: Applicative f => Map k v -> (Element (Map k v) -> f b) -> f () #

omapM_ :: Applicative m => (Element (Map k v) -> m ()) -> Map k v -> m () #

oforM_ :: Applicative m => Map k v -> (Element (Map k v) -> m ()) -> m () #

ofoldlM :: Monad m => (a -> Element (Map k v) -> m a) -> a -> Map k v -> m a #

ofoldMap1Ex :: Semigroup m => (Element (Map k v) -> m) -> Map k v -> m #

ofoldr1Ex :: (Element (Map k v) -> Element (Map k v) -> Element (Map k v)) -> Map k v -> Element (Map k v) #

ofoldl1Ex' :: (Element (Map k v) -> Element (Map k v) -> Element (Map k v)) -> Map k v -> Element (Map k v) #

headEx :: Map k v -> Element (Map k v) #

lastEx :: Map k v -> Element (Map k v) #

unsafeHead :: Map k v -> Element (Map k v) #

unsafeLast :: Map k v -> Element (Map k v) #

maximumByEx :: (Element (Map k v) -> Element (Map k v) -> Ordering) -> Map k v -> Element (Map k v) #

minimumByEx :: (Element (Map k v) -> Element (Map k v) -> Ordering) -> Map k v -> Element (Map k v) #

oelem :: Element (Map k v) -> Map k v -> Bool #

onotElem :: Element (Map k v) -> Map k v -> Bool #

MonoFunctor (Map k v) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Map k v) -> Element (Map k v)) -> Map k v -> Map k v #

MonoTraversable (Map k v) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (Map k v) -> f (Element (Map k v))) -> Map k v -> f (Map k v) #

omapM :: Applicative m => (Element (Map k v) -> m (Element (Map k v))) -> Map k v -> m (Map k v) #

(t ~ Map k' a', Ord k) => Rewrapped (Map k a) t

Use _Wrapping fromList. unwrapping returns a sorted list.

Instance details

Defined in Control.Lens.Wrapped

type Item (Map k v) 
Instance details

Defined in Data.Map.Internal

type Item (Map k v) = (k, v)
type Index (Map k a) 
Instance details

Defined in Control.Lens.At

type Index (Map k a) = k
type IxValue (Map k a) 
Instance details

Defined in Control.Lens.At

type IxValue (Map k a) = a
type Unwrapped (Map k a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (Map k a) = [(k, a)]
type Element (Map k v) 
Instance details

Defined in Data.MonoTraversable

type Element (Map k v) = v

data HashMap k v #

A map from keys to values. A map cannot contain duplicate keys; each key can map to at most one value.

Instances

Instances details
Bifoldable HashMap

Since: unordered-containers-0.2.11

Instance details

Defined in Data.HashMap.Internal

Methods

bifold :: Monoid m => HashMap m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> HashMap a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> HashMap a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> HashMap a b -> c #

Eq2 HashMap 
Instance details

Defined in Data.HashMap.Internal

Methods

liftEq2 :: (a -> b -> Bool) -> (c -> d -> Bool) -> HashMap a c -> HashMap b d -> Bool #

Ord2 HashMap 
Instance details

Defined in Data.HashMap.Internal

Methods

liftCompare2 :: (a -> b -> Ordering) -> (c -> d -> Ordering) -> HashMap a c -> HashMap b d -> Ordering #

Show2 HashMap 
Instance details

Defined in Data.HashMap.Internal

Methods

liftShowsPrec2 :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> (Int -> b -> ShowS) -> ([b] -> ShowS) -> Int -> HashMap a b -> ShowS #

liftShowList2 :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> (Int -> b -> ShowS) -> ([b] -> ShowS) -> [HashMap a b] -> ShowS #

NFData2 HashMap

Since: unordered-containers-0.2.14.0

Instance details

Defined in Data.HashMap.Internal

Methods

liftRnf2 :: (a -> ()) -> (b -> ()) -> HashMap a b -> () #

Hashable2 HashMap 
Instance details

Defined in Data.HashMap.Internal

Methods

liftHashWithSalt2 :: (Int -> a -> Int) -> (Int -> b -> Int) -> Int -> HashMap a b -> Int #

(Lift k, Lift v) => Lift (HashMap k v :: Type)

Since: unordered-containers-0.2.17.0

Instance details

Defined in Data.HashMap.Internal

Methods

lift :: Quote m => HashMap k v -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => HashMap k v -> Code m (HashMap k v) #

(FromJSONKey k, Eq k, Hashable k) => FromJSON1 (HashMap k) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (HashMap k a) #

liftParseJSONList :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [HashMap k a] #

ToJSONKey k => ToJSON1 (HashMap k) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Value) -> ([a] -> Value) -> HashMap k a -> Value #

liftToJSONList :: (a -> Value) -> ([a] -> Value) -> [HashMap k a] -> Value #

liftToEncoding :: (a -> Encoding) -> ([a] -> Encoding) -> HashMap k a -> Encoding #

liftToEncodingList :: (a -> Encoding) -> ([a] -> Encoding) -> [HashMap k a] -> Encoding #

Foldable (HashMap k) 
Instance details

Defined in Data.HashMap.Internal

Methods

fold :: Monoid m => HashMap k m -> m #

foldMap :: Monoid m => (a -> m) -> HashMap k a -> m #

foldMap' :: Monoid m => (a -> m) -> HashMap k a -> m #

foldr :: (a -> b -> b) -> b -> HashMap k a -> b #

foldr' :: (a -> b -> b) -> b -> HashMap k a -> b #

foldl :: (b -> a -> b) -> b -> HashMap k a -> b #

foldl' :: (b -> a -> b) -> b -> HashMap k a -> b #

foldr1 :: (a -> a -> a) -> HashMap k a -> a #

foldl1 :: (a -> a -> a) -> HashMap k a -> a #

toList :: HashMap k a -> [a] #

null :: HashMap k a -> Bool #

length :: HashMap k a -> Int #

elem :: Eq a => a -> HashMap k a -> Bool #

maximum :: Ord a => HashMap k a -> a #

minimum :: Ord a => HashMap k a -> a #

sum :: Num a => HashMap k a -> a #

product :: Num a => HashMap k a -> a #

Eq k => Eq1 (HashMap k) 
Instance details

Defined in Data.HashMap.Internal

Methods

liftEq :: (a -> b -> Bool) -> HashMap k a -> HashMap k b -> Bool #

Ord k => Ord1 (HashMap k) 
Instance details

Defined in Data.HashMap.Internal

Methods

liftCompare :: (a -> b -> Ordering) -> HashMap k a -> HashMap k b -> Ordering #

(Eq k, Hashable k, Read k) => Read1 (HashMap k) 
Instance details

Defined in Data.HashMap.Internal

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (HashMap k a) #

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [HashMap k a] #

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (HashMap k a) #

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [HashMap k a] #

Show k => Show1 (HashMap k) 
Instance details

Defined in Data.HashMap.Internal

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> HashMap k a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [HashMap k a] -> ShowS #

Traversable (HashMap k) 
Instance details

Defined in Data.HashMap.Internal

Methods

traverse :: Applicative f => (a -> f b) -> HashMap k a -> f (HashMap k b) #

sequenceA :: Applicative f => HashMap k (f a) -> f (HashMap k a) #

mapM :: Monad m => (a -> m b) -> HashMap k a -> m (HashMap k b) #

sequence :: Monad m => HashMap k (m a) -> m (HashMap k a) #

Functor (HashMap k) 
Instance details

Defined in Data.HashMap.Internal

Methods

fmap :: (a -> b) -> HashMap k a -> HashMap k b #

(<$) :: a -> HashMap k b -> HashMap k a #

NFData k => NFData1 (HashMap k)

Since: unordered-containers-0.2.14.0

Instance details

Defined in Data.HashMap.Internal

Methods

liftRnf :: (a -> ()) -> HashMap k a -> () #

Hashable k => Hashable1 (HashMap k) 
Instance details

Defined in Data.HashMap.Internal

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> HashMap k a -> Int #

(FromJSON v, FromJSONKey k, Eq k, Hashable k) => FromJSON (HashMap k v) 
Instance details

Defined in Data.Aeson.Types.FromJSON

(ToJSON v, ToJSONKey k) => ToJSON (HashMap k v) 
Instance details

Defined in Data.Aeson.Types.ToJSON

AWSTruncated (HashMap k v) 
Instance details

Defined in Amazonka.Pager

Methods

truncated :: HashMap k v -> Bool #

(Data k, Data v, Eq k, Hashable k) => Data (HashMap k v) 
Instance details

Defined in Data.HashMap.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> HashMap k v -> c (HashMap k v) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (HashMap k v) #

toConstr :: HashMap k v -> Constr #

dataTypeOf :: HashMap k v -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (HashMap k v)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (HashMap k v)) #

gmapT :: (forall b. Data b => b -> b) -> HashMap k v -> HashMap k v #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HashMap k v -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HashMap k v -> r #

gmapQ :: (forall d. Data d => d -> u) -> HashMap k v -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> HashMap k v -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> HashMap k v -> m (HashMap k v) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HashMap k v -> m (HashMap k v) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HashMap k v -> m (HashMap k v) #

(Eq k, Hashable k) => Monoid (HashMap k v)

mempty = empty

mappend = union

If a key occurs in both maps, the mapping from the first will be the mapping in the result.

Examples

Expand
>>> mappend (fromList [(1,'a'),(2,'b')]) (fromList [(2,'c'),(3,'d')])
fromList [(1,'a'),(2,'b'),(3,'d')]
Instance details

Defined in Data.HashMap.Internal

Methods

mempty :: HashMap k v #

mappend :: HashMap k v -> HashMap k v -> HashMap k v #

mconcat :: [HashMap k v] -> HashMap k v #

(Eq k, Hashable k) => Semigroup (HashMap k v)

<> = union

If a key occurs in both maps, the mapping from the first will be the mapping in the result.

Examples

Expand
>>> fromList [(1,'a'),(2,'b')] <> fromList [(2,'c'),(3,'d')]
fromList [(1,'a'),(2,'b'),(3,'d')]
Instance details

Defined in Data.HashMap.Internal

Methods

(<>) :: HashMap k v -> HashMap k v -> HashMap k v #

sconcat :: NonEmpty (HashMap k v) -> HashMap k v #

stimes :: Integral b => b -> HashMap k v -> HashMap k v #

(Eq k, Hashable k) => IsList (HashMap k v) 
Instance details

Defined in Data.HashMap.Internal

Associated Types

type Item (HashMap k v) #

Methods

fromList :: [Item (HashMap k v)] -> HashMap k v #

fromListN :: Int -> [Item (HashMap k v)] -> HashMap k v #

toList :: HashMap k v -> [Item (HashMap k v)] #

(Eq k, Hashable k, Read k, Read e) => Read (HashMap k e) 
Instance details

Defined in Data.HashMap.Internal

(Show k, Show v) => Show (HashMap k v) 
Instance details

Defined in Data.HashMap.Internal

Methods

showsPrec :: Int -> HashMap k v -> ShowS #

show :: HashMap k v -> String #

showList :: [HashMap k v] -> ShowS #

(NFData k, NFData v) => NFData (HashMap k v) 
Instance details

Defined in Data.HashMap.Internal

Methods

rnf :: HashMap k v -> () #

(Eq k, Eq v) => Eq (HashMap k v)

Note that, in the presence of hash collisions, equal HashMaps may behave differently, i.e. substitutivity may be violated:

>>> data D = A | B deriving (Eq, Show)
>>> instance Hashable D where hashWithSalt salt _d = salt
>>> x = fromList [(A,1), (B,2)]
>>> y = fromList [(B,2), (A,1)]
>>> x == y
True
>>> toList x
[(A,1),(B,2)]
>>> toList y
[(B,2),(A,1)]

In general, the lack of substitutivity can be observed with any function that depends on the key ordering, such as folds and traversals.

Instance details

Defined in Data.HashMap.Internal

Methods

(==) :: HashMap k v -> HashMap k v -> Bool #

(/=) :: HashMap k v -> HashMap k v -> Bool #

(Ord k, Ord v) => Ord (HashMap k v)

The ordering is total and consistent with the Eq instance. However, nothing else about the ordering is specified, and it may change from version to version of either this package or of hashable.

Instance details

Defined in Data.HashMap.Internal

Methods

compare :: HashMap k v -> HashMap k v -> Ordering #

(<) :: HashMap k v -> HashMap k v -> Bool #

(<=) :: HashMap k v -> HashMap k v -> Bool #

(>) :: HashMap k v -> HashMap k v -> Bool #

(>=) :: HashMap k v -> HashMap k v -> Bool #

max :: HashMap k v -> HashMap k v -> HashMap k v #

min :: HashMap k v -> HashMap k v -> HashMap k v #

(Hashable k, Hashable v) => Hashable (HashMap k v) 
Instance details

Defined in Data.HashMap.Internal

Methods

hashWithSalt :: Int -> HashMap k v -> Int #

hash :: HashMap k v -> Int #

(Eq k, Hashable k) => At (HashMap k a) 
Instance details

Defined in Control.Lens.At

Methods

at :: Index (HashMap k a) -> Lens' (HashMap k a) (Maybe (IxValue (HashMap k a))) #

(Eq k, Hashable k) => Ixed (HashMap k a) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (HashMap k a) -> Traversal' (HashMap k a) (IxValue (HashMap k a)) #

(Hashable k, Eq k) => Wrapped (HashMap k a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (HashMap k a) #

Methods

_Wrapped' :: Iso' (HashMap k a) (Unwrapped (HashMap k a)) #

(Eq k, Hashable k) => GrowingAppend (HashMap k v) 
Instance details

Defined in Data.MonoTraversable

MonoFoldable (HashMap k v) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (HashMap k v) -> m) -> HashMap k v -> m #

ofoldr :: (Element (HashMap k v) -> b -> b) -> b -> HashMap k v -> b #

ofoldl' :: (a -> Element (HashMap k v) -> a) -> a -> HashMap k v -> a #

otoList :: HashMap k v -> [Element (HashMap k v)] #

oall :: (Element (HashMap k v) -> Bool) -> HashMap k v -> Bool #

oany :: (Element (HashMap k v) -> Bool) -> HashMap k v -> Bool #

onull :: HashMap k v -> Bool #

olength :: HashMap k v -> Int #

olength64 :: HashMap k v -> Int64 #

ocompareLength :: Integral i => HashMap k v -> i -> Ordering #

otraverse_ :: Applicative f => (Element (HashMap k v) -> f b) -> HashMap k v -> f () #

ofor_ :: Applicative f => HashMap k v -> (Element (HashMap k v) -> f b) -> f () #

omapM_ :: Applicative m => (Element (HashMap k v) -> m ()) -> HashMap k v -> m () #

oforM_ :: Applicative m => HashMap k v -> (Element (HashMap k v) -> m ()) -> m () #

ofoldlM :: Monad m => (a -> Element (HashMap k v) -> m a) -> a -> HashMap k v -> m a #

ofoldMap1Ex :: Semigroup m => (Element (HashMap k v) -> m) -> HashMap k v -> m #

ofoldr1Ex :: (Element (HashMap k v) -> Element (HashMap k v) -> Element (HashMap k v)) -> HashMap k v -> Element (HashMap k v) #

ofoldl1Ex' :: (Element (HashMap k v) -> Element (HashMap k v) -> Element (HashMap k v)) -> HashMap k v -> Element (HashMap k v) #

headEx :: HashMap k v -> Element (HashMap k v) #

lastEx :: HashMap k v -> Element (HashMap k v) #

unsafeHead :: HashMap k v -> Element (HashMap k v) #

unsafeLast :: HashMap k v -> Element (HashMap k v) #

maximumByEx :: (Element (HashMap k v) -> Element (HashMap k v) -> Ordering) -> HashMap k v -> Element (HashMap k v) #

minimumByEx :: (Element (HashMap k v) -> Element (HashMap k v) -> Ordering) -> HashMap k v -> Element (HashMap k v) #

oelem :: Element (HashMap k v) -> HashMap k v -> Bool #

onotElem :: Element (HashMap k v) -> HashMap k v -> Bool #

MonoFunctor (HashMap k v) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (HashMap k v) -> Element (HashMap k v)) -> HashMap k v -> HashMap k v #

MonoTraversable (HashMap k v) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (HashMap k v) -> f (Element (HashMap k v))) -> HashMap k v -> f (HashMap k v) #

omapM :: Applicative m => (Element (HashMap k v) -> m (Element (HashMap k v))) -> HashMap k v -> m (HashMap k v) #

(t ~ HashMap k' a', Hashable k, Eq k) => Rewrapped (HashMap k a) t

Use _Wrapping fromList. Unwrapping returns some permutation of the list.

Instance details

Defined in Control.Lens.Wrapped

type Item (HashMap k v) 
Instance details

Defined in Data.HashMap.Internal

type Item (HashMap k v) = (k, v)
type Index (HashMap k a) 
Instance details

Defined in Control.Lens.At

type Index (HashMap k a) = k
type IxValue (HashMap k a) 
Instance details

Defined in Control.Lens.At

type IxValue (HashMap k a) = a
type Unwrapped (HashMap k a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (HashMap k a) = [(k, a)]
type Element (HashMap k v) 
Instance details

Defined in Data.MonoTraversable

type Element (HashMap k v) = v

class ToJSON a where #

A type that can be converted to JSON.

Instances in general must specify toJSON and should (but don't need to) specify toEncoding.

An example type and instance:

-- Allow ourselves to write Text literals.
{-# LANGUAGE OverloadedStrings #-}

data Coord = Coord { x :: Double, y :: Double }

instance ToJSON Coord where
  toJSON (Coord x y) = object ["x" .= x, "y" .= y]

  toEncoding (Coord x y) = pairs ("x" .= x <> "y" .= y)

Instead of manually writing your ToJSON instance, there are two options to do it automatically:

  • Data.Aeson.TH provides Template Haskell functions which will derive an instance at compile time. The generated instance is optimized for your type so it will probably be more efficient than the following option.
  • The compiler can provide a default generic implementation for toJSON.

To use the second, simply add a deriving Generic clause to your datatype and declare a ToJSON instance. If you require nothing other than defaultOptions, it is sufficient to write (and this is the only alternative where the default toJSON implementation is sufficient):

{-# LANGUAGE DeriveGeneric #-}

import GHC.Generics

data Coord = Coord { x :: Double, y :: Double } deriving Generic

instance ToJSON Coord where
    toEncoding = genericToEncoding defaultOptions

or more conveniently using the DerivingVia extension

deriving via Generically Coord instance ToJSON Coord

If on the other hand you wish to customize the generic decoding, you have to implement both methods:

customOptions = defaultOptions
                { fieldLabelModifier = map toUpper
                }

instance ToJSON Coord where
    toJSON     = genericToJSON customOptions
    toEncoding = genericToEncoding customOptions

Previous versions of this library only had the toJSON method. Adding toEncoding had two reasons:

  1. toEncoding is more efficient for the common case that the output of toJSON is directly serialized to a ByteString. Further, expressing either method in terms of the other would be non-optimal.
  2. The choice of defaults allows a smooth transition for existing users: Existing instances that do not define toEncoding still compile and have the correct semantics. This is ensured by making the default implementation of toEncoding use toJSON. This produces correct results, but since it performs an intermediate conversion to a Value, it will be less efficient than directly emitting an Encoding. (this also means that specifying nothing more than instance ToJSON Coord would be sufficient as a generically decoding instance, but there probably exists no good reason to not specify toEncoding in new instances.)

Minimal complete definition

Nothing

Methods

toJSON :: a -> Value #

Convert a Haskell value to a JSON-friendly intermediate type.

toEncoding :: a -> Encoding #

Encode a Haskell value as JSON.

The default implementation of this method creates an intermediate Value using toJSON. This provides source-level compatibility for people upgrading from older versions of this library, but obviously offers no performance advantage.

To benefit from direct encoding, you must provide an implementation for this method. The easiest way to do so is by having your types implement Generic using the DeriveGeneric extension, and then have GHC generate a method body as follows.

instance ToJSON Coord where
    toEncoding = genericToEncoding defaultOptions

toJSONList :: [a] -> Value #

toEncodingList :: [a] -> Encoding #

Instances

Instances details
ToJSON Key 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON DotNetTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Value 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON IdentityDocument 
Instance details

Defined in Amazonka.EC2.Metadata

ToJSON DescribeChangeSetResponse Source # 
Instance details

Defined in Stackctl.AWS.Orphans

ToJSON AccountFilterType 
Instance details

Defined in Amazonka.CloudFormation.Types.AccountFilterType

ToJSON AccountGateStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.AccountGateStatus

ToJSON CallAs 
Instance details

Defined in Amazonka.CloudFormation.Types.CallAs

ToJSON Capability 
Instance details

Defined in Amazonka.CloudFormation.Types.Capability

ToJSON Category 
Instance details

Defined in Amazonka.CloudFormation.Types.Category

ToJSON Change Source # 
Instance details

Defined in Stackctl.AWS.Orphans

ToJSON ChangeAction 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeAction

ToJSON ChangeSetHooksStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetHooksStatus

ToJSON ChangeSetStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetStatus

ToJSON ChangeSetType 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetType

ToJSON ChangeSource 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSource

ToJSON ChangeType 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeType

ToJSON DeprecatedStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.DeprecatedStatus

ToJSON DifferenceType 
Instance details

Defined in Amazonka.CloudFormation.Types.DifferenceType

ToJSON EvaluationType 
Instance details

Defined in Amazonka.CloudFormation.Types.EvaluationType

ToJSON ExecutionStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.ExecutionStatus

ToJSON HandlerErrorCode 
Instance details

Defined in Amazonka.CloudFormation.Types.HandlerErrorCode

ToJSON HookFailureMode 
Instance details

Defined in Amazonka.CloudFormation.Types.HookFailureMode

ToJSON HookInvocationPoint 
Instance details

Defined in Amazonka.CloudFormation.Types.HookInvocationPoint

ToJSON HookStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.HookStatus

ToJSON HookTargetType 
Instance details

Defined in Amazonka.CloudFormation.Types.HookTargetType

ToJSON IdentityProvider 
Instance details

Defined in Amazonka.CloudFormation.Types.IdentityProvider

ToJSON ModuleInfo Source # 
Instance details

Defined in Stackctl.AWS.Orphans

ToJSON OnFailure 
Instance details

Defined in Amazonka.CloudFormation.Types.OnFailure

ToJSON OperationResultFilterName 
Instance details

Defined in Amazonka.CloudFormation.Types.OperationResultFilterName

ToJSON OperationStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.OperationStatus

ToJSON Parameter Source # 
Instance details

Defined in Stackctl.AWS.Orphans

ToJSON PermissionModels 
Instance details

Defined in Amazonka.CloudFormation.Types.PermissionModels

ToJSON ProvisioningType 
Instance details

Defined in Amazonka.CloudFormation.Types.ProvisioningType

ToJSON PublisherStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.PublisherStatus

ToJSON RegionConcurrencyType 
Instance details

Defined in Amazonka.CloudFormation.Types.RegionConcurrencyType

ToJSON RegistrationStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.RegistrationStatus

ToJSON RegistryType 
Instance details

Defined in Amazonka.CloudFormation.Types.RegistryType

ToJSON Replacement 
Instance details

Defined in Amazonka.CloudFormation.Types.Replacement

ToJSON RequiresRecreation 
Instance details

Defined in Amazonka.CloudFormation.Types.RequiresRecreation

ToJSON ResourceAttribute 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceAttribute

ToJSON ResourceChange Source # 
Instance details

Defined in Stackctl.AWS.Orphans

ToJSON ResourceChangeDetail Source # 
Instance details

Defined in Stackctl.AWS.Orphans

ToJSON ResourceSignalStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceSignalStatus

ToJSON ResourceStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceStatus

ToJSON ResourceTargetDefinition Source # 
Instance details

Defined in Stackctl.AWS.Orphans

ToJSON RollbackConfiguration Source # 
Instance details

Defined in Stackctl.AWS.Orphans

ToJSON RollbackTrigger Source # 
Instance details

Defined in Stackctl.AWS.Orphans

ToJSON StackDriftDetectionStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackDriftDetectionStatus

ToJSON StackDriftStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackDriftStatus

ToJSON StackInstanceDetailedStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstanceDetailedStatus

ToJSON StackInstanceFilterName 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstanceFilterName

ToJSON StackInstanceStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstanceStatus

ToJSON StackResourceDriftStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackResourceDriftStatus

ToJSON StackSetDriftDetectionStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetDriftDetectionStatus

ToJSON StackSetDriftStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetDriftStatus

ToJSON StackSetOperationAction 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationAction

ToJSON StackSetOperationResultStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationResultStatus

ToJSON StackSetOperationStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationStatus

ToJSON StackSetStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetStatus

ToJSON StackStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackStatus

ToJSON Tag Source # 
Instance details

Defined in Stackctl.AWS.Orphans

ToJSON TemplateStage 
Instance details

Defined in Amazonka.CloudFormation.Types.TemplateStage

ToJSON ThirdPartyType 
Instance details

Defined in Amazonka.CloudFormation.Types.ThirdPartyType

ToJSON TypeTestsStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.TypeTestsStatus

ToJSON VersionBump 
Instance details

Defined in Amazonka.CloudFormation.Types.VersionBump

ToJSON Visibility 
Instance details

Defined in Amazonka.CloudFormation.Types.Visibility

ToJSON Base64 
Instance details

Defined in Amazonka.Data.Base64

ToJSON AWSTime 
Instance details

Defined in Amazonka.Data.Time

ToJSON BasicTime 
Instance details

Defined in Amazonka.Data.Time

ToJSON ISO8601 
Instance details

Defined in Amazonka.Data.Time

ToJSON POSIX 
Instance details

Defined in Amazonka.Data.Time

ToJSON RFC822 
Instance details

Defined in Amazonka.Data.Time

ToJSON AccessKey 
Instance details

Defined in Amazonka.Types

ToJSON Region 
Instance details

Defined in Amazonka.Types

ToJSON SecretKey 
Instance details

Defined in Amazonka.Types

ToJSON SessionToken 
Instance details

Defined in Amazonka.Types

ToJSON AcceleratorManufacturer 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorManufacturer

ToJSON AcceleratorName 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorName

ToJSON AcceleratorType 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorType

ToJSON AccountAttributeName 
Instance details

Defined in Amazonka.EC2.Types.AccountAttributeName

ToJSON ActivityStatus 
Instance details

Defined in Amazonka.EC2.Types.ActivityStatus

ToJSON AddressAttributeName 
Instance details

Defined in Amazonka.EC2.Types.AddressAttributeName

ToJSON AddressFamily 
Instance details

Defined in Amazonka.EC2.Types.AddressFamily

ToJSON AddressStatus 
Instance details

Defined in Amazonka.EC2.Types.AddressStatus

ToJSON AddressTransferStatus 
Instance details

Defined in Amazonka.EC2.Types.AddressTransferStatus

ToJSON Affinity 
Instance details

Defined in Amazonka.EC2.Types.Affinity

ToJSON AllocationState 
Instance details

Defined in Amazonka.EC2.Types.AllocationState

ToJSON AllocationStrategy 
Instance details

Defined in Amazonka.EC2.Types.AllocationStrategy

ToJSON AllocationType 
Instance details

Defined in Amazonka.EC2.Types.AllocationType

ToJSON AllowsMultipleInstanceTypes 
Instance details

Defined in Amazonka.EC2.Types.AllowsMultipleInstanceTypes

ToJSON AnalysisStatus 
Instance details

Defined in Amazonka.EC2.Types.AnalysisStatus

ToJSON ApplianceModeSupportValue 
Instance details

Defined in Amazonka.EC2.Types.ApplianceModeSupportValue

ToJSON ArchitectureType 
Instance details

Defined in Amazonka.EC2.Types.ArchitectureType

ToJSON ArchitectureValues 
Instance details

Defined in Amazonka.EC2.Types.ArchitectureValues

ToJSON AssociatedNetworkType 
Instance details

Defined in Amazonka.EC2.Types.AssociatedNetworkType

ToJSON AssociationStatusCode 
Instance details

Defined in Amazonka.EC2.Types.AssociationStatusCode

ToJSON AttachmentStatus 
Instance details

Defined in Amazonka.EC2.Types.AttachmentStatus

ToJSON AutoAcceptSharedAssociationsValue 
Instance details

Defined in Amazonka.EC2.Types.AutoAcceptSharedAssociationsValue

ToJSON AutoAcceptSharedAttachmentsValue 
Instance details

Defined in Amazonka.EC2.Types.AutoAcceptSharedAttachmentsValue

ToJSON AutoPlacement 
Instance details

Defined in Amazonka.EC2.Types.AutoPlacement

ToJSON AvailabilityZoneOptInStatus 
Instance details

Defined in Amazonka.EC2.Types.AvailabilityZoneOptInStatus

ToJSON AvailabilityZoneState 
Instance details

Defined in Amazonka.EC2.Types.AvailabilityZoneState

ToJSON BareMetal 
Instance details

Defined in Amazonka.EC2.Types.BareMetal

ToJSON BatchState 
Instance details

Defined in Amazonka.EC2.Types.BatchState

ToJSON BgpStatus 
Instance details

Defined in Amazonka.EC2.Types.BgpStatus

ToJSON BootModeType 
Instance details

Defined in Amazonka.EC2.Types.BootModeType

ToJSON BootModeValues 
Instance details

Defined in Amazonka.EC2.Types.BootModeValues

ToJSON BundleTaskState 
Instance details

Defined in Amazonka.EC2.Types.BundleTaskState

ToJSON BurstablePerformance 
Instance details

Defined in Amazonka.EC2.Types.BurstablePerformance

ToJSON ByoipCidrState 
Instance details

Defined in Amazonka.EC2.Types.ByoipCidrState

ToJSON CancelBatchErrorCode 
Instance details

Defined in Amazonka.EC2.Types.CancelBatchErrorCode

ToJSON CancelSpotInstanceRequestState 
Instance details

Defined in Amazonka.EC2.Types.CancelSpotInstanceRequestState

ToJSON CapacityReservationFleetState 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationFleetState

ToJSON CapacityReservationInstancePlatform 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationInstancePlatform

ToJSON CapacityReservationPreference 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationPreference

ToJSON CapacityReservationState 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationState

ToJSON CapacityReservationTenancy 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationTenancy

ToJSON CarrierGatewayState 
Instance details

Defined in Amazonka.EC2.Types.CarrierGatewayState

ToJSON ClientCertificateRevocationListStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientCertificateRevocationListStatusCode

ToJSON ClientVpnAuthenticationType 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnAuthenticationType

ToJSON ClientVpnAuthorizationRuleStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnAuthorizationRuleStatusCode

ToJSON ClientVpnConnectionStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnConnectionStatusCode

ToJSON ClientVpnEndpointAttributeStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnEndpointAttributeStatusCode

ToJSON ClientVpnEndpointStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnEndpointStatusCode

ToJSON ClientVpnRouteStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnRouteStatusCode

ToJSON ConnectionNotificationState 
Instance details

Defined in Amazonka.EC2.Types.ConnectionNotificationState

ToJSON ConnectionNotificationType 
Instance details

Defined in Amazonka.EC2.Types.ConnectionNotificationType

ToJSON ConnectivityType 
Instance details

Defined in Amazonka.EC2.Types.ConnectivityType

ToJSON ContainerFormat 
Instance details

Defined in Amazonka.EC2.Types.ContainerFormat

ToJSON ConversionTaskState 
Instance details

Defined in Amazonka.EC2.Types.ConversionTaskState

ToJSON CopyTagsFromSource 
Instance details

Defined in Amazonka.EC2.Types.CopyTagsFromSource

ToJSON CpuManufacturer 
Instance details

Defined in Amazonka.EC2.Types.CpuManufacturer

ToJSON CurrencyCodeValues 
Instance details

Defined in Amazonka.EC2.Types.CurrencyCodeValues

ToJSON DatafeedSubscriptionState 
Instance details

Defined in Amazonka.EC2.Types.DatafeedSubscriptionState

ToJSON DefaultRouteTableAssociationValue 
Instance details

Defined in Amazonka.EC2.Types.DefaultRouteTableAssociationValue

ToJSON DefaultRouteTablePropagationValue 
Instance details

Defined in Amazonka.EC2.Types.DefaultRouteTablePropagationValue

ToJSON DefaultTargetCapacityType 
Instance details

Defined in Amazonka.EC2.Types.DefaultTargetCapacityType

ToJSON DeleteFleetErrorCode 
Instance details

Defined in Amazonka.EC2.Types.DeleteFleetErrorCode

ToJSON DeleteQueuedReservedInstancesErrorCode 
Instance details

Defined in Amazonka.EC2.Types.DeleteQueuedReservedInstancesErrorCode

ToJSON DestinationFileFormat 
Instance details

Defined in Amazonka.EC2.Types.DestinationFileFormat

ToJSON DeviceTrustProviderType 
Instance details

Defined in Amazonka.EC2.Types.DeviceTrustProviderType

ToJSON DeviceType 
Instance details

Defined in Amazonka.EC2.Types.DeviceType

ToJSON DiskImageFormat 
Instance details

Defined in Amazonka.EC2.Types.DiskImageFormat

ToJSON DiskType 
Instance details

Defined in Amazonka.EC2.Types.DiskType

ToJSON DnsNameState 
Instance details

Defined in Amazonka.EC2.Types.DnsNameState

ToJSON DnsRecordIpType 
Instance details

Defined in Amazonka.EC2.Types.DnsRecordIpType

ToJSON DnsSupportValue 
Instance details

Defined in Amazonka.EC2.Types.DnsSupportValue

ToJSON DomainType 
Instance details

Defined in Amazonka.EC2.Types.DomainType

ToJSON DynamicRoutingValue 
Instance details

Defined in Amazonka.EC2.Types.DynamicRoutingValue

ToJSON EbsEncryptionSupport 
Instance details

Defined in Amazonka.EC2.Types.EbsEncryptionSupport

ToJSON EbsNvmeSupport 
Instance details

Defined in Amazonka.EC2.Types.EbsNvmeSupport

ToJSON EbsOptimizedSupport 
Instance details

Defined in Amazonka.EC2.Types.EbsOptimizedSupport

ToJSON ElasticGpuState 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpuState

ToJSON ElasticGpuStatus 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpuStatus

ToJSON EnaSupport 
Instance details

Defined in Amazonka.EC2.Types.EnaSupport

ToJSON EndDateType 
Instance details

Defined in Amazonka.EC2.Types.EndDateType

ToJSON EphemeralNvmeSupport 
Instance details

Defined in Amazonka.EC2.Types.EphemeralNvmeSupport

ToJSON EventCode 
Instance details

Defined in Amazonka.EC2.Types.EventCode

ToJSON EventType 
Instance details

Defined in Amazonka.EC2.Types.EventType

ToJSON ExcessCapacityTerminationPolicy 
Instance details

Defined in Amazonka.EC2.Types.ExcessCapacityTerminationPolicy

ToJSON ExportEnvironment 
Instance details

Defined in Amazonka.EC2.Types.ExportEnvironment

ToJSON ExportTaskState 
Instance details

Defined in Amazonka.EC2.Types.ExportTaskState

ToJSON FastLaunchResourceType 
Instance details

Defined in Amazonka.EC2.Types.FastLaunchResourceType

ToJSON FastLaunchStateCode 
Instance details

Defined in Amazonka.EC2.Types.FastLaunchStateCode

ToJSON FastSnapshotRestoreStateCode 
Instance details

Defined in Amazonka.EC2.Types.FastSnapshotRestoreStateCode

ToJSON FindingsFound 
Instance details

Defined in Amazonka.EC2.Types.FindingsFound

ToJSON FleetActivityStatus 
Instance details

Defined in Amazonka.EC2.Types.FleetActivityStatus

ToJSON FleetCapacityReservationTenancy 
Instance details

Defined in Amazonka.EC2.Types.FleetCapacityReservationTenancy

ToJSON FleetCapacityReservationUsageStrategy 
Instance details

Defined in Amazonka.EC2.Types.FleetCapacityReservationUsageStrategy

ToJSON FleetEventType 
Instance details

Defined in Amazonka.EC2.Types.FleetEventType

ToJSON FleetExcessCapacityTerminationPolicy 
Instance details

Defined in Amazonka.EC2.Types.FleetExcessCapacityTerminationPolicy

ToJSON FleetInstanceMatchCriteria 
Instance details

Defined in Amazonka.EC2.Types.FleetInstanceMatchCriteria

ToJSON FleetOnDemandAllocationStrategy 
Instance details

Defined in Amazonka.EC2.Types.FleetOnDemandAllocationStrategy

ToJSON FleetReplacementStrategy 
Instance details

Defined in Amazonka.EC2.Types.FleetReplacementStrategy

ToJSON FleetStateCode 
Instance details

Defined in Amazonka.EC2.Types.FleetStateCode

ToJSON FleetType 
Instance details

Defined in Amazonka.EC2.Types.FleetType

ToJSON FlowLogsResourceType 
Instance details

Defined in Amazonka.EC2.Types.FlowLogsResourceType

ToJSON FpgaImageAttributeName 
Instance details

Defined in Amazonka.EC2.Types.FpgaImageAttributeName

ToJSON FpgaImageStateCode 
Instance details

Defined in Amazonka.EC2.Types.FpgaImageStateCode

ToJSON GatewayAssociationState 
Instance details

Defined in Amazonka.EC2.Types.GatewayAssociationState

ToJSON GatewayType 
Instance details

Defined in Amazonka.EC2.Types.GatewayType

ToJSON HostRecovery 
Instance details

Defined in Amazonka.EC2.Types.HostRecovery

ToJSON HostTenancy 
Instance details

Defined in Amazonka.EC2.Types.HostTenancy

ToJSON HostnameType 
Instance details

Defined in Amazonka.EC2.Types.HostnameType

ToJSON HttpTokensState 
Instance details

Defined in Amazonka.EC2.Types.HttpTokensState

ToJSON HypervisorType 
Instance details

Defined in Amazonka.EC2.Types.HypervisorType

ToJSON IamInstanceProfileAssociationState 
Instance details

Defined in Amazonka.EC2.Types.IamInstanceProfileAssociationState

ToJSON Igmpv2SupportValue 
Instance details

Defined in Amazonka.EC2.Types.Igmpv2SupportValue

ToJSON ImageAttributeName 
Instance details

Defined in Amazonka.EC2.Types.ImageAttributeName

ToJSON ImageState 
Instance details

Defined in Amazonka.EC2.Types.ImageState

ToJSON ImageTypeValues 
Instance details

Defined in Amazonka.EC2.Types.ImageTypeValues

ToJSON ImdsSupportValues 
Instance details

Defined in Amazonka.EC2.Types.ImdsSupportValues

ToJSON InstanceAttributeName 
Instance details

Defined in Amazonka.EC2.Types.InstanceAttributeName

ToJSON InstanceAutoRecoveryState 
Instance details

Defined in Amazonka.EC2.Types.InstanceAutoRecoveryState

ToJSON InstanceEventWindowState 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindowState

ToJSON InstanceGeneration 
Instance details

Defined in Amazonka.EC2.Types.InstanceGeneration

ToJSON InstanceHealthStatus 
Instance details

Defined in Amazonka.EC2.Types.InstanceHealthStatus

ToJSON InstanceInterruptionBehavior 
Instance details

Defined in Amazonka.EC2.Types.InstanceInterruptionBehavior

ToJSON InstanceLifecycle 
Instance details

Defined in Amazonka.EC2.Types.InstanceLifecycle

ToJSON InstanceLifecycleType 
Instance details

Defined in Amazonka.EC2.Types.InstanceLifecycleType

ToJSON InstanceMatchCriteria 
Instance details

Defined in Amazonka.EC2.Types.InstanceMatchCriteria

ToJSON InstanceMetadataEndpointState 
Instance details

Defined in Amazonka.EC2.Types.InstanceMetadataEndpointState

ToJSON InstanceMetadataOptionsState 
Instance details

Defined in Amazonka.EC2.Types.InstanceMetadataOptionsState

ToJSON InstanceMetadataProtocolState 
Instance details

Defined in Amazonka.EC2.Types.InstanceMetadataProtocolState

ToJSON InstanceMetadataTagsState 
Instance details

Defined in Amazonka.EC2.Types.InstanceMetadataTagsState

ToJSON InstanceStateName 
Instance details

Defined in Amazonka.EC2.Types.InstanceStateName

ToJSON InstanceStorageEncryptionSupport 
Instance details

Defined in Amazonka.EC2.Types.InstanceStorageEncryptionSupport

ToJSON InstanceType 
Instance details

Defined in Amazonka.EC2.Types.InstanceType

ToJSON InstanceTypeHypervisor 
Instance details

Defined in Amazonka.EC2.Types.InstanceTypeHypervisor

ToJSON InterfacePermissionType 
Instance details

Defined in Amazonka.EC2.Types.InterfacePermissionType

ToJSON InterfaceProtocolType 
Instance details

Defined in Amazonka.EC2.Types.InterfaceProtocolType

ToJSON IpAddressType 
Instance details

Defined in Amazonka.EC2.Types.IpAddressType

ToJSON IpamAddressHistoryResourceType 
Instance details

Defined in Amazonka.EC2.Types.IpamAddressHistoryResourceType

ToJSON IpamComplianceStatus 
Instance details

Defined in Amazonka.EC2.Types.IpamComplianceStatus

ToJSON IpamManagementState 
Instance details

Defined in Amazonka.EC2.Types.IpamManagementState

ToJSON IpamOverlapStatus 
Instance details

Defined in Amazonka.EC2.Types.IpamOverlapStatus

ToJSON IpamPoolAllocationResourceType 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolAllocationResourceType

ToJSON IpamPoolAwsService 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolAwsService

ToJSON IpamPoolCidrFailureCode 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolCidrFailureCode

ToJSON IpamPoolCidrState 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolCidrState

ToJSON IpamPoolState 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolState

ToJSON IpamResourceType 
Instance details

Defined in Amazonka.EC2.Types.IpamResourceType

ToJSON IpamScopeState 
Instance details

Defined in Amazonka.EC2.Types.IpamScopeState

ToJSON IpamScopeType 
Instance details

Defined in Amazonka.EC2.Types.IpamScopeType

ToJSON IpamState 
Instance details

Defined in Amazonka.EC2.Types.IpamState

ToJSON Ipv6SupportValue 
Instance details

Defined in Amazonka.EC2.Types.Ipv6SupportValue

ToJSON KeyFormat 
Instance details

Defined in Amazonka.EC2.Types.KeyFormat

ToJSON KeyType 
Instance details

Defined in Amazonka.EC2.Types.KeyType

ToJSON LaunchTemplateAutoRecoveryState 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateAutoRecoveryState

ToJSON LaunchTemplateErrorCode 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateErrorCode

ToJSON LaunchTemplateHttpTokensState 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateHttpTokensState

ToJSON LaunchTemplateInstanceMetadataEndpointState 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMetadataEndpointState

ToJSON LaunchTemplateInstanceMetadataOptionsState 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMetadataOptionsState

ToJSON LaunchTemplateInstanceMetadataProtocolIpv6 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMetadataProtocolIpv6

ToJSON LaunchTemplateInstanceMetadataTagsState 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMetadataTagsState

ToJSON ListingState 
Instance details

Defined in Amazonka.EC2.Types.ListingState

ToJSON ListingStatus 
Instance details

Defined in Amazonka.EC2.Types.ListingStatus

ToJSON LocalGatewayRouteState 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRouteState

ToJSON LocalGatewayRouteTableMode 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRouteTableMode

ToJSON LocalGatewayRouteType 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRouteType

ToJSON LocalStorage 
Instance details

Defined in Amazonka.EC2.Types.LocalStorage

ToJSON LocalStorageType 
Instance details

Defined in Amazonka.EC2.Types.LocalStorageType

ToJSON LocationType 
Instance details

Defined in Amazonka.EC2.Types.LocationType

ToJSON LogDestinationType 
Instance details

Defined in Amazonka.EC2.Types.LogDestinationType

ToJSON MarketType 
Instance details

Defined in Amazonka.EC2.Types.MarketType

ToJSON MembershipType 
Instance details

Defined in Amazonka.EC2.Types.MembershipType

ToJSON MetricType 
Instance details

Defined in Amazonka.EC2.Types.MetricType

ToJSON ModifyAvailabilityZoneOptInStatus 
Instance details

Defined in Amazonka.EC2.Types.ModifyAvailabilityZoneOptInStatus

ToJSON MonitoringState 
Instance details

Defined in Amazonka.EC2.Types.MonitoringState

ToJSON MoveStatus 
Instance details

Defined in Amazonka.EC2.Types.MoveStatus

ToJSON MulticastSupportValue 
Instance details

Defined in Amazonka.EC2.Types.MulticastSupportValue

ToJSON NatGatewayState 
Instance details

Defined in Amazonka.EC2.Types.NatGatewayState

ToJSON NetworkInterfaceAttribute 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceAttribute

ToJSON NetworkInterfaceCreationType 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceCreationType

ToJSON NetworkInterfacePermissionStateCode 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfacePermissionStateCode

ToJSON NetworkInterfaceStatus 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceStatus

ToJSON NetworkInterfaceType 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceType

ToJSON OfferingClassType 
Instance details

Defined in Amazonka.EC2.Types.OfferingClassType

ToJSON OfferingTypeValues 
Instance details

Defined in Amazonka.EC2.Types.OfferingTypeValues

ToJSON OnDemandAllocationStrategy 
Instance details

Defined in Amazonka.EC2.Types.OnDemandAllocationStrategy

ToJSON OperationType 
Instance details

Defined in Amazonka.EC2.Types.OperationType

ToJSON PartitionLoadFrequency 
Instance details

Defined in Amazonka.EC2.Types.PartitionLoadFrequency

ToJSON PayerResponsibility 
Instance details

Defined in Amazonka.EC2.Types.PayerResponsibility

ToJSON PaymentOption 
Instance details

Defined in Amazonka.EC2.Types.PaymentOption

ToJSON PeriodType 
Instance details

Defined in Amazonka.EC2.Types.PeriodType

ToJSON PermissionGroup 
Instance details

Defined in Amazonka.EC2.Types.PermissionGroup

ToJSON PlacementGroupState 
Instance details

Defined in Amazonka.EC2.Types.PlacementGroupState

ToJSON PlacementGroupStrategy 
Instance details

Defined in Amazonka.EC2.Types.PlacementGroupStrategy

ToJSON PlacementStrategy 
Instance details

Defined in Amazonka.EC2.Types.PlacementStrategy

ToJSON PlatformValues 
Instance details

Defined in Amazonka.EC2.Types.PlatformValues

ToJSON PrefixListState 
Instance details

Defined in Amazonka.EC2.Types.PrefixListState

ToJSON PrincipalType 
Instance details

Defined in Amazonka.EC2.Types.PrincipalType

ToJSON ProductCodeValues 
Instance details

Defined in Amazonka.EC2.Types.ProductCodeValues

ToJSON Protocol 
Instance details

Defined in Amazonka.EC2.Types.Protocol

ToJSON ProtocolValue 
Instance details

Defined in Amazonka.EC2.Types.ProtocolValue

ToJSON RIProductDescription 
Instance details

Defined in Amazonka.EC2.Types.RIProductDescription

ToJSON RecurringChargeFrequency 
Instance details

Defined in Amazonka.EC2.Types.RecurringChargeFrequency

ToJSON ReplaceRootVolumeTaskState 
Instance details

Defined in Amazonka.EC2.Types.ReplaceRootVolumeTaskState

ToJSON ReplacementStrategy 
Instance details

Defined in Amazonka.EC2.Types.ReplacementStrategy

ToJSON ReportInstanceReasonCodes 
Instance details

Defined in Amazonka.EC2.Types.ReportInstanceReasonCodes

ToJSON ReportStatusType 
Instance details

Defined in Amazonka.EC2.Types.ReportStatusType

ToJSON ReservationState 
Instance details

Defined in Amazonka.EC2.Types.ReservationState

ToJSON ReservedInstanceState 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstanceState

ToJSON ResetFpgaImageAttributeName 
Instance details

Defined in Amazonka.EC2.Types.ResetFpgaImageAttributeName

ToJSON ResetImageAttributeName 
Instance details

Defined in Amazonka.EC2.Types.ResetImageAttributeName

ToJSON ResourceType 
Instance details

Defined in Amazonka.EC2.Types.ResourceType

ToJSON RootDeviceType 
Instance details

Defined in Amazonka.EC2.Types.RootDeviceType

ToJSON RouteOrigin 
Instance details

Defined in Amazonka.EC2.Types.RouteOrigin

ToJSON RouteState 
Instance details

Defined in Amazonka.EC2.Types.RouteState

ToJSON RouteTableAssociationStateCode 
Instance details

Defined in Amazonka.EC2.Types.RouteTableAssociationStateCode

ToJSON RuleAction 
Instance details

Defined in Amazonka.EC2.Types.RuleAction

ToJSON Scope 
Instance details

Defined in Amazonka.EC2.Types.Scope

ToJSON SelfServicePortal 
Instance details

Defined in Amazonka.EC2.Types.SelfServicePortal

ToJSON ServiceConnectivityType 
Instance details

Defined in Amazonka.EC2.Types.ServiceConnectivityType

ToJSON ServiceState 
Instance details

Defined in Amazonka.EC2.Types.ServiceState

ToJSON ServiceType 
Instance details

Defined in Amazonka.EC2.Types.ServiceType

ToJSON ShutdownBehavior 
Instance details

Defined in Amazonka.EC2.Types.ShutdownBehavior

ToJSON SnapshotAttributeName 
Instance details

Defined in Amazonka.EC2.Types.SnapshotAttributeName

ToJSON SnapshotState 
Instance details

Defined in Amazonka.EC2.Types.SnapshotState

ToJSON SpotAllocationStrategy 
Instance details

Defined in Amazonka.EC2.Types.SpotAllocationStrategy

ToJSON SpotInstanceInterruptionBehavior 
Instance details

Defined in Amazonka.EC2.Types.SpotInstanceInterruptionBehavior

ToJSON SpotInstanceState 
Instance details

Defined in Amazonka.EC2.Types.SpotInstanceState

ToJSON SpotInstanceType 
Instance details

Defined in Amazonka.EC2.Types.SpotInstanceType

ToJSON SpreadLevel 
Instance details

Defined in Amazonka.EC2.Types.SpreadLevel

ToJSON State 
Instance details

Defined in Amazonka.EC2.Types.State

ToJSON StaticSourcesSupportValue 
Instance details

Defined in Amazonka.EC2.Types.StaticSourcesSupportValue

ToJSON StatisticType 
Instance details

Defined in Amazonka.EC2.Types.StatisticType

ToJSON StatusName 
Instance details

Defined in Amazonka.EC2.Types.StatusName

ToJSON StatusType 
Instance details

Defined in Amazonka.EC2.Types.StatusType

ToJSON StorageTier 
Instance details

Defined in Amazonka.EC2.Types.StorageTier

ToJSON SubnetCidrBlockStateCode 
Instance details

Defined in Amazonka.EC2.Types.SubnetCidrBlockStateCode

ToJSON SubnetCidrReservationType 
Instance details

Defined in Amazonka.EC2.Types.SubnetCidrReservationType

ToJSON SubnetState 
Instance details

Defined in Amazonka.EC2.Types.SubnetState

ToJSON SummaryStatus 
Instance details

Defined in Amazonka.EC2.Types.SummaryStatus

ToJSON TargetCapacityUnitType 
Instance details

Defined in Amazonka.EC2.Types.TargetCapacityUnitType

ToJSON TargetStorageTier 
Instance details

Defined in Amazonka.EC2.Types.TargetStorageTier

ToJSON TelemetryStatus 
Instance details

Defined in Amazonka.EC2.Types.TelemetryStatus

ToJSON Tenancy 
Instance details

Defined in Amazonka.EC2.Types.Tenancy

ToJSON TieringOperationStatus 
Instance details

Defined in Amazonka.EC2.Types.TieringOperationStatus

ToJSON TpmSupportValues 
Instance details

Defined in Amazonka.EC2.Types.TpmSupportValues

ToJSON TrafficDirection 
Instance details

Defined in Amazonka.EC2.Types.TrafficDirection

ToJSON TrafficMirrorFilterRuleField 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorFilterRuleField

ToJSON TrafficMirrorNetworkService 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorNetworkService

ToJSON TrafficMirrorRuleAction 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorRuleAction

ToJSON TrafficMirrorSessionField 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorSessionField

ToJSON TrafficMirrorTargetType 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorTargetType

ToJSON TrafficType 
Instance details

Defined in Amazonka.EC2.Types.TrafficType

ToJSON TransitGatewayAssociationState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAssociationState

ToJSON TransitGatewayAttachmentResourceType 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAttachmentResourceType

ToJSON TransitGatewayAttachmentState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAttachmentState

ToJSON TransitGatewayConnectPeerState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayConnectPeerState

ToJSON TransitGatewayMulitcastDomainAssociationState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulitcastDomainAssociationState

ToJSON TransitGatewayMulticastDomainState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastDomainState

ToJSON TransitGatewayPolicyTableState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPolicyTableState

ToJSON TransitGatewayPrefixListReferenceState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPrefixListReferenceState

ToJSON TransitGatewayPropagationState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPropagationState

ToJSON TransitGatewayRouteState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteState

ToJSON TransitGatewayRouteTableAnnouncementDirection 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTableAnnouncementDirection

ToJSON TransitGatewayRouteTableAnnouncementState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTableAnnouncementState

ToJSON TransitGatewayRouteTableState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTableState

ToJSON TransitGatewayRouteType 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteType

ToJSON TransitGatewayState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayState

ToJSON TransportProtocol 
Instance details

Defined in Amazonka.EC2.Types.TransportProtocol

ToJSON TrustProviderType 
Instance details

Defined in Amazonka.EC2.Types.TrustProviderType

ToJSON TunnelInsideIpVersion 
Instance details

Defined in Amazonka.EC2.Types.TunnelInsideIpVersion

ToJSON UnlimitedSupportedInstanceFamily 
Instance details

Defined in Amazonka.EC2.Types.UnlimitedSupportedInstanceFamily

ToJSON UnsuccessfulInstanceCreditSpecificationErrorCode 
Instance details

Defined in Amazonka.EC2.Types.UnsuccessfulInstanceCreditSpecificationErrorCode

ToJSON UsageClassType 
Instance details

Defined in Amazonka.EC2.Types.UsageClassType

ToJSON UserTrustProviderType 
Instance details

Defined in Amazonka.EC2.Types.UserTrustProviderType

ToJSON VerifiedAccessEndpointAttachmentType 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointAttachmentType

ToJSON VerifiedAccessEndpointProtocol 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointProtocol

ToJSON VerifiedAccessEndpointStatusCode 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointStatusCode

ToJSON VerifiedAccessEndpointType 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointType

ToJSON VerifiedAccessLogDeliveryStatusCode 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogDeliveryStatusCode

ToJSON VirtualizationType 
Instance details

Defined in Amazonka.EC2.Types.VirtualizationType

ToJSON VolumeAttachmentState 
Instance details

Defined in Amazonka.EC2.Types.VolumeAttachmentState

ToJSON VolumeAttributeName 
Instance details

Defined in Amazonka.EC2.Types.VolumeAttributeName

ToJSON VolumeModificationState 
Instance details

Defined in Amazonka.EC2.Types.VolumeModificationState

ToJSON VolumeState 
Instance details

Defined in Amazonka.EC2.Types.VolumeState

ToJSON VolumeStatusInfoStatus 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusInfoStatus

ToJSON VolumeStatusName 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusName

ToJSON VolumeType 
Instance details

Defined in Amazonka.EC2.Types.VolumeType

ToJSON VpcAttributeName 
Instance details

Defined in Amazonka.EC2.Types.VpcAttributeName

ToJSON VpcCidrBlockStateCode 
Instance details

Defined in Amazonka.EC2.Types.VpcCidrBlockStateCode

ToJSON VpcEndpointType 
Instance details

Defined in Amazonka.EC2.Types.VpcEndpointType

ToJSON VpcPeeringConnectionStateReasonCode 
Instance details

Defined in Amazonka.EC2.Types.VpcPeeringConnectionStateReasonCode

ToJSON VpcState 
Instance details

Defined in Amazonka.EC2.Types.VpcState

ToJSON VpcTenancy 
Instance details

Defined in Amazonka.EC2.Types.VpcTenancy

ToJSON VpnEcmpSupportValue 
Instance details

Defined in Amazonka.EC2.Types.VpnEcmpSupportValue

ToJSON VpnProtocol 
Instance details

Defined in Amazonka.EC2.Types.VpnProtocol

ToJSON VpnState 
Instance details

Defined in Amazonka.EC2.Types.VpnState

ToJSON VpnStaticRouteSource 
Instance details

Defined in Amazonka.EC2.Types.VpnStaticRouteSource

ToJSON WeekDay 
Instance details

Defined in Amazonka.EC2.Types.WeekDay

ToJSON AliasRoutingConfiguration 
Instance details

Defined in Amazonka.Lambda.Types.AliasRoutingConfiguration

ToJSON AllowedPublishers 
Instance details

Defined in Amazonka.Lambda.Types.AllowedPublishers

ToJSON AmazonManagedKafkaEventSourceConfig 
Instance details

Defined in Amazonka.Lambda.Types.AmazonManagedKafkaEventSourceConfig

ToJSON Architecture 
Instance details

Defined in Amazonka.Lambda.Types.Architecture

ToJSON CodeSigningPolicies 
Instance details

Defined in Amazonka.Lambda.Types.CodeSigningPolicies

ToJSON CodeSigningPolicy 
Instance details

Defined in Amazonka.Lambda.Types.CodeSigningPolicy

ToJSON Cors 
Instance details

Defined in Amazonka.Lambda.Types.Cors

ToJSON DeadLetterConfig 
Instance details

Defined in Amazonka.Lambda.Types.DeadLetterConfig

ToJSON DestinationConfig 
Instance details

Defined in Amazonka.Lambda.Types.DestinationConfig

ToJSON EndPointType 
Instance details

Defined in Amazonka.Lambda.Types.EndPointType

ToJSON Environment 
Instance details

Defined in Amazonka.Lambda.Types.Environment

ToJSON EphemeralStorage 
Instance details

Defined in Amazonka.Lambda.Types.EphemeralStorage

ToJSON EventSourcePosition 
Instance details

Defined in Amazonka.Lambda.Types.EventSourcePosition

ToJSON FileSystemConfig 
Instance details

Defined in Amazonka.Lambda.Types.FileSystemConfig

ToJSON Filter 
Instance details

Defined in Amazonka.Lambda.Types.Filter

ToJSON FilterCriteria 
Instance details

Defined in Amazonka.Lambda.Types.FilterCriteria

ToJSON FunctionCode 
Instance details

Defined in Amazonka.Lambda.Types.FunctionCode

ToJSON FunctionResponseType 
Instance details

Defined in Amazonka.Lambda.Types.FunctionResponseType

ToJSON FunctionUrlAuthType 
Instance details

Defined in Amazonka.Lambda.Types.FunctionUrlAuthType

ToJSON FunctionVersion 
Instance details

Defined in Amazonka.Lambda.Types.FunctionVersion

ToJSON ImageConfig 
Instance details

Defined in Amazonka.Lambda.Types.ImageConfig

ToJSON InvocationType 
Instance details

Defined in Amazonka.Lambda.Types.InvocationType

ToJSON LastUpdateStatus 
Instance details

Defined in Amazonka.Lambda.Types.LastUpdateStatus

ToJSON LastUpdateStatusReasonCode 
Instance details

Defined in Amazonka.Lambda.Types.LastUpdateStatusReasonCode

ToJSON LayerVersionContentInput 
Instance details

Defined in Amazonka.Lambda.Types.LayerVersionContentInput

ToJSON LogType 
Instance details

Defined in Amazonka.Lambda.Types.LogType

ToJSON OnFailure 
Instance details

Defined in Amazonka.Lambda.Types.OnFailure

ToJSON OnSuccess 
Instance details

Defined in Amazonka.Lambda.Types.OnSuccess

ToJSON PackageType 
Instance details

Defined in Amazonka.Lambda.Types.PackageType

ToJSON ProvisionedConcurrencyStatusEnum 
Instance details

Defined in Amazonka.Lambda.Types.ProvisionedConcurrencyStatusEnum

ToJSON Runtime 
Instance details

Defined in Amazonka.Lambda.Types.Runtime

ToJSON SelfManagedEventSource 
Instance details

Defined in Amazonka.Lambda.Types.SelfManagedEventSource

ToJSON SelfManagedKafkaEventSourceConfig 
Instance details

Defined in Amazonka.Lambda.Types.SelfManagedKafkaEventSourceConfig

ToJSON SnapStart 
Instance details

Defined in Amazonka.Lambda.Types.SnapStart

ToJSON SnapStartApplyOn 
Instance details

Defined in Amazonka.Lambda.Types.SnapStartApplyOn

ToJSON SnapStartOptimizationStatus 
Instance details

Defined in Amazonka.Lambda.Types.SnapStartOptimizationStatus

ToJSON SourceAccessConfiguration 
Instance details

Defined in Amazonka.Lambda.Types.SourceAccessConfiguration

ToJSON SourceAccessType 
Instance details

Defined in Amazonka.Lambda.Types.SourceAccessType

ToJSON State 
Instance details

Defined in Amazonka.Lambda.Types.State

ToJSON StateReasonCode 
Instance details

Defined in Amazonka.Lambda.Types.StateReasonCode

ToJSON TracingConfig 
Instance details

Defined in Amazonka.Lambda.Types.TracingConfig

ToJSON TracingMode 
Instance details

Defined in Amazonka.Lambda.Types.TracingMode

ToJSON VpcConfig 
Instance details

Defined in Amazonka.Lambda.Types.VpcConfig

ToJSON Logout 
Instance details

Defined in Amazonka.SSO.Logout

ToJSON Number 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Version 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Void 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON CTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Int16 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Int32 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Int64 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Int8 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Word16 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Word32 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Word64 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Word8 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON IntSet 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Ordering 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON LoggedMessage 
Instance details

Defined in Control.Monad.Logger.Aeson.Internal

ToJSON Scientific 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON ChangeSetId Source # 
Instance details

Defined in Stackctl.AWS.CloudFormation

ToJSON ChangeSetName Source # 
Instance details

Defined in Stackctl.AWS.CloudFormation

ToJSON StackId Source # 
Instance details

Defined in Stackctl.AWS.CloudFormation

ToJSON StackName Source # 
Instance details

Defined in Stackctl.AWS.CloudFormation

ToJSON StackTemplate Source # 
Instance details

Defined in Stackctl.AWS.CloudFormation

ToJSON AccountId Source # 
Instance details

Defined in Stackctl.AWS.Core

ToJSON LambdaError Source # 
Instance details

Defined in Stackctl.AWS.Lambda

ToJSON AwsScope Source # 
Instance details

Defined in Stackctl.AWS.Scope

ToJSON Action Source # 
Instance details

Defined in Stackctl.Action

ToJSON ActionOn Source # 
Instance details

Defined in Stackctl.Action

ToJSON ActionRun Source # 
Instance details

Defined in Stackctl.Action

ToJSON RequiredVersion Source # 
Instance details

Defined in Stackctl.Config.RequiredVersion

ToJSON FilterOption Source # 
Instance details

Defined in Stackctl.FilterOption

ToJSON StackDescription Source # 
Instance details

Defined in Stackctl.StackDescription

ToJSON ParametersYaml Source # 
Instance details

Defined in Stackctl.StackSpecYaml

ToJSON StackSpecYaml Source # 
Instance details

Defined in Stackctl.StackSpecYaml

ToJSON TagsYaml Source # 
Instance details

Defined in Stackctl.StackSpecYaml

ToJSON Text 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Text 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON ShortText

Since: aeson-2.0.2.0

Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON CalendarDiffDays 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Day 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Month 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Quarter 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON QuarterOfYear 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON DayOfWeek 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON DiffTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON NominalDiffTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON SystemTime

Encoded as number

Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON UTCTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON CalendarDiffTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON LocalTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON TimeOfDay 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON ZonedTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON UUID 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Integer 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Natural 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON () 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: () -> Value #

toEncoding :: () -> Encoding #

toJSONList :: [()] -> Value #

toEncodingList :: [()] -> Encoding #

ToJSON Bool 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Char 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Double 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Float 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Int 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Word 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON v => ToJSON (KeyMap v) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a => ToJSON (Sensitive a) 
Instance details

Defined in Amazonka.Data.Sensitive

ToJSON a => ToJSON (Identity a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a => ToJSON (First a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a => ToJSON (Last a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a => ToJSON (First a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a => ToJSON (Last a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a => ToJSON (Max a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Max a -> Value #

toEncoding :: Max a -> Encoding #

toJSONList :: [Max a] -> Value #

toEncodingList :: [Max a] -> Encoding #

ToJSON a => ToJSON (Min a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Min a -> Value #

toEncoding :: Min a -> Encoding #

toJSONList :: [Min a] -> Value #

toEncodingList :: [Min a] -> Encoding #

ToJSON a => ToJSON (WrappedMonoid a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a => ToJSON (Dual a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

(ToJSON a, Integral a) => ToJSON (Ratio a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a => ToJSON (IntMap a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a => ToJSON (Seq a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Seq a -> Value #

toEncoding :: Seq a -> Encoding #

toJSONList :: [Seq a] -> Value #

toEncodingList :: [Seq a] -> Encoding #

ToJSON a => ToJSON (Set a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Set a -> Value #

toEncoding :: Set a -> Encoding #

toJSONList :: [Set a] -> Value #

toEncodingList :: [Set a] -> Encoding #

ToJSON v => ToJSON (Tree v) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON1 f => ToJSON (Fix f)

Since: aeson-1.5.3.0

Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Fix f -> Value #

toEncoding :: Fix f -> Encoding #

toJSONList :: [Fix f] -> Value #

toEncodingList :: [Fix f] -> Encoding #

(ToJSON1 f, Functor f) => ToJSON (Mu f)

Since: aeson-1.5.3.0

Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Mu f -> Value #

toEncoding :: Mu f -> Encoding #

toJSONList :: [Mu f] -> Value #

toEncodingList :: [Mu f] -> Encoding #

(ToJSON1 f, Functor f) => ToJSON (Nu f)

Since: aeson-1.5.3.0

Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Nu f -> Value #

toEncoding :: Nu f -> Encoding #

toJSONList :: [Nu f] -> Value #

toEncodingList :: [Nu f] -> Encoding #

ToJSON a => ToJSON (DNonEmpty a)

Since: aeson-1.5.3.0

Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a => ToJSON (DList a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

(Generic a, GToJSON' Value Zero (Rep a), GToJSON' Encoding Zero (Rep a)) => ToJSON (Generically a)

Since: aeson-2.1.0.0

Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a => ToJSON (Array a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

(Prim a, ToJSON a) => ToJSON (PrimArray a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a => ToJSON (SmallArray a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a => ToJSON (OneOrListOf a) Source # 
Instance details

Defined in Stackctl.OneOrListOf

ToJSON a => ToJSON (Maybe a)

Since: aeson-1.5.3.0

Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a => ToJSON (HashSet a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a => ToJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

(Prim a, ToJSON a) => ToJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

(Storable a, ToJSON a) => ToJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

(Vector Vector a, ToJSON a) => ToJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a => ToJSON (NonEmpty a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a => ToJSON (Maybe a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a => ToJSON (a)

Since: aeson-2.0.2.0

Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: (a) -> Value #

toEncoding :: (a) -> Encoding #

toJSONList :: [(a)] -> Value #

toEncodingList :: [(a)] -> Encoding #

ToJSON a => ToJSON [a] 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: [a] -> Value #

toEncoding :: [a] -> Encoding #

toJSONList :: [[a]] -> Value #

toEncodingList :: [[a]] -> Encoding #

(ToJSON a, ToJSON b) => ToJSON (Either a b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Either a b -> Value #

toEncoding :: Either a b -> Encoding #

toJSONList :: [Either a b] -> Value #

toEncodingList :: [Either a b] -> Encoding #

HasResolution a => ToJSON (Fixed a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON (Proxy a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

(ToJSON v, ToJSONKey k) => ToJSON (Map k v) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Map k v -> Value #

toEncoding :: Map k v -> Encoding #

toJSONList :: [Map k v] -> Value #

toEncodingList :: [Map k v] -> Encoding #

(ToJSON a, ToJSON b) => ToJSON (Either a b)

Since: aeson-1.5.3.0

Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Either a b -> Value #

toEncoding :: Either a b -> Encoding #

toJSONList :: [Either a b] -> Value #

toEncodingList :: [Either a b] -> Encoding #

(ToJSON a, ToJSON b) => ToJSON (These a b)

Since: aeson-1.5.3.0

Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: These a b -> Value #

toEncoding :: These a b -> Encoding #

toJSONList :: [These a b] -> Value #

toEncodingList :: [These a b] -> Encoding #

(ToJSON a, ToJSON b) => ToJSON (Pair a b)

Since: aeson-1.5.3.0

Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Pair a b -> Value #

toEncoding :: Pair a b -> Encoding #

toJSONList :: [Pair a b] -> Value #

toEncodingList :: [Pair a b] -> Encoding #

(ToJSON a, ToJSON b) => ToJSON (These a b)

Since: aeson-1.5.1.0

Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: These a b -> Value #

toEncoding :: These a b -> Encoding #

toJSONList :: [These a b] -> Value #

toEncodingList :: [These a b] -> Encoding #

(ToJSON v, ToJSONKey k) => ToJSON (HashMap k v) 
Instance details

Defined in Data.Aeson.Types.ToJSON

(ToJSON a, ToJSON b) => ToJSON (a, b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: (a, b) -> Value #

toEncoding :: (a, b) -> Encoding #

toJSONList :: [(a, b)] -> Value #

toEncodingList :: [(a, b)] -> Encoding #

ToJSON a => ToJSON (Const a b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Const a b -> Value #

toEncoding :: Const a b -> Encoding #

toJSONList :: [Const a b] -> Value #

toEncodingList :: [Const a b] -> Encoding #

ToJSON b => ToJSON (Tagged a b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Tagged a b -> Value #

toEncoding :: Tagged a b -> Encoding #

toJSONList :: [Tagged a b] -> Value #

toEncodingList :: [Tagged a b] -> Encoding #

(ToJSON1 f, ToJSON1 g, ToJSON a) => ToJSON (These1 f g a)

Since: aeson-1.5.1.0

Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: These1 f g a -> Value #

toEncoding :: These1 f g a -> Encoding #

toJSONList :: [These1 f g a] -> Value #

toEncodingList :: [These1 f g a] -> Encoding #

(ToJSON a, ToJSON b, ToJSON c) => ToJSON (a, b, c) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: (a, b, c) -> Value #

toEncoding :: (a, b, c) -> Encoding #

toJSONList :: [(a, b, c)] -> Value #

toEncodingList :: [(a, b, c)] -> Encoding #

(ToJSON1 f, ToJSON1 g, ToJSON a) => ToJSON (Product f g a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Product f g a -> Value #

toEncoding :: Product f g a -> Encoding #

toJSONList :: [Product f g a] -> Value #

toEncodingList :: [Product f g a] -> Encoding #

(ToJSON1 f, ToJSON1 g, ToJSON a) => ToJSON (Sum f g a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Sum f g a -> Value #

toEncoding :: Sum f g a -> Encoding #

toJSONList :: [Sum f g a] -> Value #

toEncodingList :: [Sum f g a] -> Encoding #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d) => ToJSON (a, b, c, d) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: (a, b, c, d) -> Value #

toEncoding :: (a, b, c, d) -> Encoding #

toJSONList :: [(a, b, c, d)] -> Value #

toEncodingList :: [(a, b, c, d)] -> Encoding #

(ToJSON1 f, ToJSON1 g, ToJSON a) => ToJSON (Compose f g a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Compose f g a -> Value #

toEncoding :: Compose f g a -> Encoding #

toJSONList :: [Compose f g a] -> Value #

toEncodingList :: [Compose f g a] -> Encoding #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e) => ToJSON (a, b, c, d, e) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: (a, b, c, d, e) -> Value #

toEncoding :: (a, b, c, d, e) -> Encoding #

toJSONList :: [(a, b, c, d, e)] -> Value #

toEncodingList :: [(a, b, c, d, e)] -> Encoding #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f) => ToJSON (a, b, c, d, e, f) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: (a, b, c, d, e, f) -> Value #

toEncoding :: (a, b, c, d, e, f) -> Encoding #

toJSONList :: [(a, b, c, d, e, f)] -> Value #

toEncodingList :: [(a, b, c, d, e, f)] -> Encoding #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g) => ToJSON (a, b, c, d, e, f, g) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: (a, b, c, d, e, f, g) -> Value #

toEncoding :: (a, b, c, d, e, f, g) -> Encoding #

toJSONList :: [(a, b, c, d, e, f, g)] -> Value #

toEncodingList :: [(a, b, c, d, e, f, g)] -> Encoding #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h) => ToJSON (a, b, c, d, e, f, g, h) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: (a, b, c, d, e, f, g, h) -> Value #

toEncoding :: (a, b, c, d, e, f, g, h) -> Encoding #

toJSONList :: [(a, b, c, d, e, f, g, h)] -> Value #

toEncodingList :: [(a, b, c, d, e, f, g, h)] -> Encoding #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h, ToJSON i) => ToJSON (a, b, c, d, e, f, g, h, i) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: (a, b, c, d, e, f, g, h, i) -> Value #

toEncoding :: (a, b, c, d, e, f, g, h, i) -> Encoding #

toJSONList :: [(a, b, c, d, e, f, g, h, i)] -> Value #

toEncodingList :: [(a, b, c, d, e, f, g, h, i)] -> Encoding #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h, ToJSON i, ToJSON j) => ToJSON (a, b, c, d, e, f, g, h, i, j) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: (a, b, c, d, e, f, g, h, i, j) -> Value #

toEncoding :: (a, b, c, d, e, f, g, h, i, j) -> Encoding #

toJSONList :: [(a, b, c, d, e, f, g, h, i, j)] -> Value #

toEncodingList :: [(a, b, c, d, e, f, g, h, i, j)] -> Encoding #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h, ToJSON i, ToJSON j, ToJSON k) => ToJSON (a, b, c, d, e, f, g, h, i, j, k) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: (a, b, c, d, e, f, g, h, i, j, k) -> Value #

toEncoding :: (a, b, c, d, e, f, g, h, i, j, k) -> Encoding #

toJSONList :: [(a, b, c, d, e, f, g, h, i, j, k)] -> Value #

toEncodingList :: [(a, b, c, d, e, f, g, h, i, j, k)] -> Encoding #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h, ToJSON i, ToJSON j, ToJSON k, ToJSON l) => ToJSON (a, b, c, d, e, f, g, h, i, j, k, l) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: (a, b, c, d, e, f, g, h, i, j, k, l) -> Value #

toEncoding :: (a, b, c, d, e, f, g, h, i, j, k, l) -> Encoding #

toJSONList :: [(a, b, c, d, e, f, g, h, i, j, k, l)] -> Value #

toEncodingList :: [(a, b, c, d, e, f, g, h, i, j, k, l)] -> Encoding #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h, ToJSON i, ToJSON j, ToJSON k, ToJSON l, ToJSON m) => ToJSON (a, b, c, d, e, f, g, h, i, j, k, l, m) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Value #

toEncoding :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Encoding #

toJSONList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m)] -> Value #

toEncodingList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m)] -> Encoding #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h, ToJSON i, ToJSON j, ToJSON k, ToJSON l, ToJSON m, ToJSON n) => ToJSON (a, b, c, d, e, f, g, h, i, j, k, l, m, n) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Value #

toEncoding :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Encoding #

toJSONList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m, n)] -> Value #

toEncodingList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m, n)] -> Encoding #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h, ToJSON i, ToJSON j, ToJSON k, ToJSON l, ToJSON m, ToJSON n, ToJSON o) => ToJSON (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Value #

toEncoding :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Encoding #

toJSONList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)] -> Value #

toEncodingList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)] -> Encoding #

(.=) :: (KeyValue kv, ToJSON v) => Key -> v -> kv infixr 8 #

object :: [Pair] -> Value #

Create a Value from a list of name/value Pairs. If duplicate keys arise, later keys and their associated values win.

data IORef a #

A mutable variable in the IO monad

Instances

Instances details
NFData1 IORef

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> IORef a -> () #

NFData (IORef a)

NOTE: Only strict in the reference and not the referenced value.

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: IORef a -> () #

Eq (IORef a)

Pointer equality.

Since: base-4.0.0.0

Instance details

Defined in GHC.IORef

Methods

(==) :: IORef a -> IORef a -> Bool #

(/=) :: IORef a -> IORef a -> Bool #

data HashSet a #

A set of values. A set cannot contain duplicate values.

Instances

Instances details
ToJSON1 HashSet 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Value) -> ([a] -> Value) -> HashSet a -> Value #

liftToJSONList :: (a -> Value) -> ([a] -> Value) -> [HashSet a] -> Value #

liftToEncoding :: (a -> Encoding) -> ([a] -> Encoding) -> HashSet a -> Encoding #

liftToEncodingList :: (a -> Encoding) -> ([a] -> Encoding) -> [HashSet a] -> Encoding #

Foldable HashSet 
Instance details

Defined in Data.HashSet.Internal

Methods

fold :: Monoid m => HashSet m -> m #

foldMap :: Monoid m => (a -> m) -> HashSet a -> m #

foldMap' :: Monoid m => (a -> m) -> HashSet a -> m #

foldr :: (a -> b -> b) -> b -> HashSet a -> b #

foldr' :: (a -> b -> b) -> b -> HashSet a -> b #

foldl :: (b -> a -> b) -> b -> HashSet a -> b #

foldl' :: (b -> a -> b) -> b -> HashSet a -> b #

foldr1 :: (a -> a -> a) -> HashSet a -> a #

foldl1 :: (a -> a -> a) -> HashSet a -> a #

toList :: HashSet a -> [a] #

null :: HashSet a -> Bool #

length :: HashSet a -> Int #

elem :: Eq a => a -> HashSet a -> Bool #

maximum :: Ord a => HashSet a -> a #

minimum :: Ord a => HashSet a -> a #

sum :: Num a => HashSet a -> a #

product :: Num a => HashSet a -> a #

Eq1 HashSet 
Instance details

Defined in Data.HashSet.Internal

Methods

liftEq :: (a -> b -> Bool) -> HashSet a -> HashSet b -> Bool #

Ord1 HashSet 
Instance details

Defined in Data.HashSet.Internal

Methods

liftCompare :: (a -> b -> Ordering) -> HashSet a -> HashSet b -> Ordering #

Show1 HashSet 
Instance details

Defined in Data.HashSet.Internal

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> HashSet a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [HashSet a] -> ShowS #

NFData1 HashSet

Since: unordered-containers-0.2.14.0

Instance details

Defined in Data.HashSet.Internal

Methods

liftRnf :: (a -> ()) -> HashSet a -> () #

Hashable1 HashSet 
Instance details

Defined in Data.HashSet.Internal

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> HashSet a -> Int #

Lift a => Lift (HashSet a :: TYPE LiftedRep)

Since: unordered-containers-0.2.17.0

Instance details

Defined in Data.HashSet.Internal

Methods

lift :: Quote m => HashSet a -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => HashSet a -> Code m (HashSet a) #

(Eq a, Hashable a, FromJSON a) => FromJSON (HashSet a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON a => ToJSON (HashSet a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

(Data a, Eq a, Hashable a) => Data (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> HashSet a -> c (HashSet a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (HashSet a) #

toConstr :: HashSet a -> Constr #

dataTypeOf :: HashSet a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (HashSet a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (HashSet a)) #

gmapT :: (forall b. Data b => b -> b) -> HashSet a -> HashSet a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HashSet a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HashSet a -> r #

gmapQ :: (forall d. Data d => d -> u) -> HashSet a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> HashSet a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> HashSet a -> m (HashSet a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HashSet a -> m (HashSet a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HashSet a -> m (HashSet a) #

(Hashable a, Eq a) => Monoid (HashSet a)

mempty = empty

mappend = union

\(O(n+m)\)

To obtain good performance, the smaller set must be presented as the first argument.

Examples

Expand
>>> mappend (fromList [1,2]) (fromList [2,3])
fromList [1,2,3]
Instance details

Defined in Data.HashSet.Internal

Methods

mempty :: HashSet a #

mappend :: HashSet a -> HashSet a -> HashSet a #

mconcat :: [HashSet a] -> HashSet a #

(Hashable a, Eq a) => Semigroup (HashSet a)

<> = union

\(O(n+m)\)

To obtain good performance, the smaller set must be presented as the first argument.

Examples

Expand
>>> fromList [1,2] <> fromList [2,3]
fromList [1,2,3]
Instance details

Defined in Data.HashSet.Internal

Methods

(<>) :: HashSet a -> HashSet a -> HashSet a #

sconcat :: NonEmpty (HashSet a) -> HashSet a #

stimes :: Integral b => b -> HashSet a -> HashSet a #

(Eq a, Hashable a) => IsList (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Associated Types

type Item (HashSet a) #

Methods

fromList :: [Item (HashSet a)] -> HashSet a #

fromListN :: Int -> [Item (HashSet a)] -> HashSet a #

toList :: HashSet a -> [Item (HashSet a)] #

(Eq a, Hashable a, Read a) => Read (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Show a => Show (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Methods

showsPrec :: Int -> HashSet a -> ShowS #

show :: HashSet a -> String #

showList :: [HashSet a] -> ShowS #

NFData a => NFData (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Methods

rnf :: HashSet a -> () #

Eq a => Eq (HashSet a)

Note that, in the presence of hash collisions, equal HashSets may behave differently, i.e. substitutivity may be violated:

>>> data D = A | B deriving (Eq, Show)
>>> instance Hashable D where hashWithSalt salt _d = salt
>>> x = fromList [A, B]
>>> y = fromList [B, A]
>>> x == y
True
>>> toList x
[A,B]
>>> toList y
[B,A]

In general, the lack of substitutivity can be observed with any function that depends on the key ordering, such as folds and traversals.

Instance details

Defined in Data.HashSet.Internal

Methods

(==) :: HashSet a -> HashSet a -> Bool #

(/=) :: HashSet a -> HashSet a -> Bool #

Ord a => Ord (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Methods

compare :: HashSet a -> HashSet a -> Ordering #

(<) :: HashSet a -> HashSet a -> Bool #

(<=) :: HashSet a -> HashSet a -> Bool #

(>) :: HashSet a -> HashSet a -> Bool #

(>=) :: HashSet a -> HashSet a -> Bool #

max :: HashSet a -> HashSet a -> HashSet a #

min :: HashSet a -> HashSet a -> HashSet a #

Hashable a => Hashable (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Methods

hashWithSalt :: Int -> HashSet a -> Int #

hash :: HashSet a -> Int #

(Eq k, Hashable k) => At (HashSet k) 
Instance details

Defined in Control.Lens.At

Methods

at :: Index (HashSet k) -> Lens' (HashSet k) (Maybe (IxValue (HashSet k))) #

(Eq a, Hashable a) => Contains (HashSet a) 
Instance details

Defined in Control.Lens.At

Methods

contains :: Index (HashSet a) -> Lens' (HashSet a) Bool #

(Eq k, Hashable k) => Ixed (HashSet k) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (HashSet k) -> Traversal' (HashSet k) (IxValue (HashSet k)) #

(Hashable a, Eq a) => Wrapped (HashSet a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (HashSet a) #

Methods

_Wrapped' :: Iso' (HashSet a) (Unwrapped (HashSet a)) #

(Eq v, Hashable v) => GrowingAppend (HashSet v) 
Instance details

Defined in Data.MonoTraversable

MonoFoldable (HashSet e) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (HashSet e) -> m) -> HashSet e -> m #

ofoldr :: (Element (HashSet e) -> b -> b) -> b -> HashSet e -> b #

ofoldl' :: (a -> Element (HashSet e) -> a) -> a -> HashSet e -> a #

otoList :: HashSet e -> [Element (HashSet e)] #

oall :: (Element (HashSet e) -> Bool) -> HashSet e -> Bool #

oany :: (Element (HashSet e) -> Bool) -> HashSet e -> Bool #

onull :: HashSet e -> Bool #

olength :: HashSet e -> Int #

olength64 :: HashSet e -> Int64 #

ocompareLength :: Integral i => HashSet e -> i -> Ordering #

otraverse_ :: Applicative f => (Element (HashSet e) -> f b) -> HashSet e -> f () #

ofor_ :: Applicative f => HashSet e -> (Element (HashSet e) -> f b) -> f () #

omapM_ :: Applicative m => (Element (HashSet e) -> m ()) -> HashSet e -> m () #

oforM_ :: Applicative m => HashSet e -> (Element (HashSet e) -> m ()) -> m () #

ofoldlM :: Monad m => (a -> Element (HashSet e) -> m a) -> a -> HashSet e -> m a #

ofoldMap1Ex :: Semigroup m => (Element (HashSet e) -> m) -> HashSet e -> m #

ofoldr1Ex :: (Element (HashSet e) -> Element (HashSet e) -> Element (HashSet e)) -> HashSet e -> Element (HashSet e) #

ofoldl1Ex' :: (Element (HashSet e) -> Element (HashSet e) -> Element (HashSet e)) -> HashSet e -> Element (HashSet e) #

headEx :: HashSet e -> Element (HashSet e) #

lastEx :: HashSet e -> Element (HashSet e) #

unsafeHead :: HashSet e -> Element (HashSet e) #

unsafeLast :: HashSet e -> Element (HashSet e) #

maximumByEx :: (Element (HashSet e) -> Element (HashSet e) -> Ordering) -> HashSet e -> Element (HashSet e) #

minimumByEx :: (Element (HashSet e) -> Element (HashSet e) -> Ordering) -> HashSet e -> Element (HashSet e) #

oelem :: Element (HashSet e) -> HashSet e -> Bool #

onotElem :: Element (HashSet e) -> HashSet e -> Bool #

Hashable a => MonoPointed (HashSet a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (HashSet a) -> HashSet a #

(t ~ HashSet a', Hashable a, Eq a) => Rewrapped (HashSet a) t

Use _Wrapping fromList. Unwrapping returns some permutation of the list.

Instance details

Defined in Control.Lens.Wrapped

type Item (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

type Item (HashSet a) = a
type Index (HashSet a) 
Instance details

Defined in Control.Lens.At

type Index (HashSet a) = a
type IxValue (HashSet k) 
Instance details

Defined in Control.Lens.At

type IxValue (HashSet k) = ()
type Unwrapped (HashSet a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (HashSet a) = [a]
type Element (HashSet e) 
Instance details

Defined in Data.MonoTraversable

type Element (HashSet e) = e

class NFData a where #

A class of types that can be fully evaluated.

Since: deepseq-1.1.0.0

Minimal complete definition

Nothing

Methods

rnf :: a -> () #

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

Instances details
NFData Key 
Instance details

Defined in Data.Aeson.Key

Methods

rnf :: Key -> () #

NFData JSONPathElement 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

rnf :: JSONPathElement -> () #

NFData Value 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

rnf :: Value -> () #

NFData ActivateType 
Instance details

Defined in Amazonka.CloudFormation.ActivateType

Methods

rnf :: ActivateType -> () #

NFData ActivateTypeResponse 
Instance details

Defined in Amazonka.CloudFormation.ActivateType

Methods

rnf :: ActivateTypeResponse -> () #

NFData BatchDescribeTypeConfigurations 
Instance details

Defined in Amazonka.CloudFormation.BatchDescribeTypeConfigurations

NFData BatchDescribeTypeConfigurationsResponse 
Instance details

Defined in Amazonka.CloudFormation.BatchDescribeTypeConfigurations

NFData CancelUpdateStack 
Instance details

Defined in Amazonka.CloudFormation.CancelUpdateStack

Methods

rnf :: CancelUpdateStack -> () #

NFData CancelUpdateStackResponse 
Instance details

Defined in Amazonka.CloudFormation.CancelUpdateStack

NFData ContinueUpdateRollback 
Instance details

Defined in Amazonka.CloudFormation.ContinueUpdateRollback

Methods

rnf :: ContinueUpdateRollback -> () #

NFData ContinueUpdateRollbackResponse 
Instance details

Defined in Amazonka.CloudFormation.ContinueUpdateRollback

NFData CreateChangeSet 
Instance details

Defined in Amazonka.CloudFormation.CreateChangeSet

Methods

rnf :: CreateChangeSet -> () #

NFData CreateChangeSetResponse 
Instance details

Defined in Amazonka.CloudFormation.CreateChangeSet

Methods

rnf :: CreateChangeSetResponse -> () #

NFData CreateStack 
Instance details

Defined in Amazonka.CloudFormation.CreateStack

Methods

rnf :: CreateStack -> () #

NFData CreateStackResponse 
Instance details

Defined in Amazonka.CloudFormation.CreateStack

Methods

rnf :: CreateStackResponse -> () #

NFData CreateStackInstances 
Instance details

Defined in Amazonka.CloudFormation.CreateStackInstances

Methods

rnf :: CreateStackInstances -> () #

NFData CreateStackInstancesResponse 
Instance details

Defined in Amazonka.CloudFormation.CreateStackInstances

NFData CreateStackSet 
Instance details

Defined in Amazonka.CloudFormation.CreateStackSet

Methods

rnf :: CreateStackSet -> () #

NFData CreateStackSetResponse 
Instance details

Defined in Amazonka.CloudFormation.CreateStackSet

Methods

rnf :: CreateStackSetResponse -> () #

NFData DeactivateType 
Instance details

Defined in Amazonka.CloudFormation.DeactivateType

Methods

rnf :: DeactivateType -> () #

NFData DeactivateTypeResponse 
Instance details

Defined in Amazonka.CloudFormation.DeactivateType

Methods

rnf :: DeactivateTypeResponse -> () #

NFData DeleteChangeSet 
Instance details

Defined in Amazonka.CloudFormation.DeleteChangeSet

Methods

rnf :: DeleteChangeSet -> () #

NFData DeleteChangeSetResponse 
Instance details

Defined in Amazonka.CloudFormation.DeleteChangeSet

Methods

rnf :: DeleteChangeSetResponse -> () #

NFData DeleteStack 
Instance details

Defined in Amazonka.CloudFormation.DeleteStack

Methods

rnf :: DeleteStack -> () #

NFData DeleteStackResponse 
Instance details

Defined in Amazonka.CloudFormation.DeleteStack

Methods

rnf :: DeleteStackResponse -> () #

NFData DeleteStackInstances 
Instance details

Defined in Amazonka.CloudFormation.DeleteStackInstances

Methods

rnf :: DeleteStackInstances -> () #

NFData DeleteStackInstancesResponse 
Instance details

Defined in Amazonka.CloudFormation.DeleteStackInstances

NFData DeleteStackSet 
Instance details

Defined in Amazonka.CloudFormation.DeleteStackSet

Methods

rnf :: DeleteStackSet -> () #

NFData DeleteStackSetResponse 
Instance details

Defined in Amazonka.CloudFormation.DeleteStackSet

Methods

rnf :: DeleteStackSetResponse -> () #

NFData DeregisterType 
Instance details

Defined in Amazonka.CloudFormation.DeregisterType

Methods

rnf :: DeregisterType -> () #

NFData DeregisterTypeResponse 
Instance details

Defined in Amazonka.CloudFormation.DeregisterType

Methods

rnf :: DeregisterTypeResponse -> () #

NFData DescribeAccountLimits 
Instance details

Defined in Amazonka.CloudFormation.DescribeAccountLimits

Methods

rnf :: DescribeAccountLimits -> () #

NFData DescribeAccountLimitsResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeAccountLimits

NFData DescribeChangeSet 
Instance details

Defined in Amazonka.CloudFormation.DescribeChangeSet

Methods

rnf :: DescribeChangeSet -> () #

NFData DescribeChangeSetResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeChangeSet

NFData DescribeChangeSetHooks 
Instance details

Defined in Amazonka.CloudFormation.DescribeChangeSetHooks

Methods

rnf :: DescribeChangeSetHooks -> () #

NFData DescribeChangeSetHooksResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeChangeSetHooks

NFData DescribePublisher 
Instance details

Defined in Amazonka.CloudFormation.DescribePublisher

Methods

rnf :: DescribePublisher -> () #

NFData DescribePublisherResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribePublisher

NFData DescribeStackDriftDetectionStatus 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackDriftDetectionStatus

NFData DescribeStackDriftDetectionStatusResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackDriftDetectionStatus

NFData DescribeStackEvents 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackEvents

Methods

rnf :: DescribeStackEvents -> () #

NFData DescribeStackEventsResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackEvents

NFData DescribeStackInstance 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackInstance

Methods

rnf :: DescribeStackInstance -> () #

NFData DescribeStackInstanceResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackInstance

NFData DescribeStackResource 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackResource

Methods

rnf :: DescribeStackResource -> () #

NFData DescribeStackResourceResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackResource

NFData DescribeStackResourceDrifts 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackResourceDrifts

NFData DescribeStackResourceDriftsResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackResourceDrifts

NFData DescribeStackResources 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackResources

Methods

rnf :: DescribeStackResources -> () #

NFData DescribeStackResourcesResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackResources

NFData DescribeStackSet 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackSet

Methods

rnf :: DescribeStackSet -> () #

NFData DescribeStackSetResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackSet

NFData DescribeStackSetOperation 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackSetOperation

NFData DescribeStackSetOperationResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStackSetOperation

NFData DescribeStacks 
Instance details

Defined in Amazonka.CloudFormation.DescribeStacks

Methods

rnf :: DescribeStacks -> () #

NFData DescribeStacksResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeStacks

Methods

rnf :: DescribeStacksResponse -> () #

NFData DescribeType 
Instance details

Defined in Amazonka.CloudFormation.DescribeType

Methods

rnf :: DescribeType -> () #

NFData DescribeTypeResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeType

Methods

rnf :: DescribeTypeResponse -> () #

NFData DescribeTypeRegistration 
Instance details

Defined in Amazonka.CloudFormation.DescribeTypeRegistration

NFData DescribeTypeRegistrationResponse 
Instance details

Defined in Amazonka.CloudFormation.DescribeTypeRegistration

NFData DetectStackDrift 
Instance details

Defined in Amazonka.CloudFormation.DetectStackDrift

Methods

rnf :: DetectStackDrift -> () #

NFData DetectStackDriftResponse 
Instance details

Defined in Amazonka.CloudFormation.DetectStackDrift

NFData DetectStackResourceDrift 
Instance details

Defined in Amazonka.CloudFormation.DetectStackResourceDrift

NFData DetectStackResourceDriftResponse 
Instance details

Defined in Amazonka.CloudFormation.DetectStackResourceDrift

NFData DetectStackSetDrift 
Instance details

Defined in Amazonka.CloudFormation.DetectStackSetDrift

Methods

rnf :: DetectStackSetDrift -> () #

NFData DetectStackSetDriftResponse 
Instance details

Defined in Amazonka.CloudFormation.DetectStackSetDrift

NFData EstimateTemplateCost 
Instance details

Defined in Amazonka.CloudFormation.EstimateTemplateCost

Methods

rnf :: EstimateTemplateCost -> () #

NFData EstimateTemplateCostResponse 
Instance details

Defined in Amazonka.CloudFormation.EstimateTemplateCost

NFData ExecuteChangeSet 
Instance details

Defined in Amazonka.CloudFormation.ExecuteChangeSet

Methods

rnf :: ExecuteChangeSet -> () #

NFData ExecuteChangeSetResponse 
Instance details

Defined in Amazonka.CloudFormation.ExecuteChangeSet

NFData GetStackPolicy 
Instance details

Defined in Amazonka.CloudFormation.GetStackPolicy

Methods

rnf :: GetStackPolicy -> () #

NFData GetStackPolicyResponse 
Instance details

Defined in Amazonka.CloudFormation.GetStackPolicy

Methods

rnf :: GetStackPolicyResponse -> () #

NFData GetTemplate 
Instance details

Defined in Amazonka.CloudFormation.GetTemplate

Methods

rnf :: GetTemplate -> () #

NFData GetTemplateResponse 
Instance details

Defined in Amazonka.CloudFormation.GetTemplate

Methods

rnf :: GetTemplateResponse -> () #

NFData GetTemplateSummary 
Instance details

Defined in Amazonka.CloudFormation.GetTemplateSummary

Methods

rnf :: GetTemplateSummary -> () #

NFData GetTemplateSummaryResponse 
Instance details

Defined in Amazonka.CloudFormation.GetTemplateSummary

NFData ImportStacksToStackSet 
Instance details

Defined in Amazonka.CloudFormation.ImportStacksToStackSet

Methods

rnf :: ImportStacksToStackSet -> () #

NFData ImportStacksToStackSetResponse 
Instance details

Defined in Amazonka.CloudFormation.ImportStacksToStackSet

NFData ListChangeSets 
Instance details

Defined in Amazonka.CloudFormation.ListChangeSets

Methods

rnf :: ListChangeSets -> () #

NFData ListChangeSetsResponse 
Instance details

Defined in Amazonka.CloudFormation.ListChangeSets

Methods

rnf :: ListChangeSetsResponse -> () #

NFData ListExports 
Instance details

Defined in Amazonka.CloudFormation.ListExports

Methods

rnf :: ListExports -> () #

NFData ListExportsResponse 
Instance details

Defined in Amazonka.CloudFormation.ListExports

Methods

rnf :: ListExportsResponse -> () #

NFData ListImports 
Instance details

Defined in Amazonka.CloudFormation.ListImports

Methods

rnf :: ListImports -> () #

NFData ListImportsResponse 
Instance details

Defined in Amazonka.CloudFormation.ListImports

Methods

rnf :: ListImportsResponse -> () #

NFData ListStackInstances 
Instance details

Defined in Amazonka.CloudFormation.ListStackInstances

Methods

rnf :: ListStackInstances -> () #

NFData ListStackInstancesResponse 
Instance details

Defined in Amazonka.CloudFormation.ListStackInstances

NFData ListStackResources 
Instance details

Defined in Amazonka.CloudFormation.ListStackResources

Methods

rnf :: ListStackResources -> () #

NFData ListStackResourcesResponse 
Instance details

Defined in Amazonka.CloudFormation.ListStackResources

NFData ListStackSetOperationResults 
Instance details

Defined in Amazonka.CloudFormation.ListStackSetOperationResults

NFData ListStackSetOperationResultsResponse 
Instance details

Defined in Amazonka.CloudFormation.ListStackSetOperationResults

NFData ListStackSetOperations 
Instance details

Defined in Amazonka.CloudFormation.ListStackSetOperations

Methods

rnf :: ListStackSetOperations -> () #

NFData ListStackSetOperationsResponse 
Instance details

Defined in Amazonka.CloudFormation.ListStackSetOperations

NFData ListStackSets 
Instance details

Defined in Amazonka.CloudFormation.ListStackSets

Methods

rnf :: ListStackSets -> () #

NFData ListStackSetsResponse 
Instance details

Defined in Amazonka.CloudFormation.ListStackSets

Methods

rnf :: ListStackSetsResponse -> () #

NFData ListStacks 
Instance details

Defined in Amazonka.CloudFormation.ListStacks

Methods

rnf :: ListStacks -> () #

NFData ListStacksResponse 
Instance details

Defined in Amazonka.CloudFormation.ListStacks

Methods

rnf :: ListStacksResponse -> () #

NFData ListTypeRegistrations 
Instance details

Defined in Amazonka.CloudFormation.ListTypeRegistrations

Methods

rnf :: ListTypeRegistrations -> () #

NFData ListTypeRegistrationsResponse 
Instance details

Defined in Amazonka.CloudFormation.ListTypeRegistrations

NFData ListTypeVersions 
Instance details

Defined in Amazonka.CloudFormation.ListTypeVersions

Methods

rnf :: ListTypeVersions -> () #

NFData ListTypeVersionsResponse 
Instance details

Defined in Amazonka.CloudFormation.ListTypeVersions

NFData ListTypes 
Instance details

Defined in Amazonka.CloudFormation.ListTypes

Methods

rnf :: ListTypes -> () #

NFData ListTypesResponse 
Instance details

Defined in Amazonka.CloudFormation.ListTypes

Methods

rnf :: ListTypesResponse -> () #

NFData PublishType 
Instance details

Defined in Amazonka.CloudFormation.PublishType

Methods

rnf :: PublishType -> () #

NFData PublishTypeResponse 
Instance details

Defined in Amazonka.CloudFormation.PublishType

Methods

rnf :: PublishTypeResponse -> () #

NFData RecordHandlerProgress 
Instance details

Defined in Amazonka.CloudFormation.RecordHandlerProgress

Methods

rnf :: RecordHandlerProgress -> () #

NFData RecordHandlerProgressResponse 
Instance details

Defined in Amazonka.CloudFormation.RecordHandlerProgress

NFData RegisterPublisher 
Instance details

Defined in Amazonka.CloudFormation.RegisterPublisher

Methods

rnf :: RegisterPublisher -> () #

NFData RegisterPublisherResponse 
Instance details

Defined in Amazonka.CloudFormation.RegisterPublisher

NFData RegisterType 
Instance details

Defined in Amazonka.CloudFormation.RegisterType

Methods

rnf :: RegisterType -> () #

NFData RegisterTypeResponse 
Instance details

Defined in Amazonka.CloudFormation.RegisterType

Methods

rnf :: RegisterTypeResponse -> () #

NFData RollbackStack 
Instance details

Defined in Amazonka.CloudFormation.RollbackStack

Methods

rnf :: RollbackStack -> () #

NFData RollbackStackResponse 
Instance details

Defined in Amazonka.CloudFormation.RollbackStack

Methods

rnf :: RollbackStackResponse -> () #

NFData SetStackPolicy 
Instance details

Defined in Amazonka.CloudFormation.SetStackPolicy

Methods

rnf :: SetStackPolicy -> () #

NFData SetStackPolicyResponse 
Instance details

Defined in Amazonka.CloudFormation.SetStackPolicy

Methods

rnf :: SetStackPolicyResponse -> () #

NFData SetTypeConfiguration 
Instance details

Defined in Amazonka.CloudFormation.SetTypeConfiguration

Methods

rnf :: SetTypeConfiguration -> () #

NFData SetTypeConfigurationResponse 
Instance details

Defined in Amazonka.CloudFormation.SetTypeConfiguration

NFData SetTypeDefaultVersion 
Instance details

Defined in Amazonka.CloudFormation.SetTypeDefaultVersion

Methods

rnf :: SetTypeDefaultVersion -> () #

NFData SetTypeDefaultVersionResponse 
Instance details

Defined in Amazonka.CloudFormation.SetTypeDefaultVersion

NFData SignalResource 
Instance details

Defined in Amazonka.CloudFormation.SignalResource

Methods

rnf :: SignalResource -> () #

NFData SignalResourceResponse 
Instance details

Defined in Amazonka.CloudFormation.SignalResource

Methods

rnf :: SignalResourceResponse -> () #

NFData StopStackSetOperation 
Instance details

Defined in Amazonka.CloudFormation.StopStackSetOperation

Methods

rnf :: StopStackSetOperation -> () #

NFData StopStackSetOperationResponse 
Instance details

Defined in Amazonka.CloudFormation.StopStackSetOperation

NFData TestType 
Instance details

Defined in Amazonka.CloudFormation.TestType

Methods

rnf :: TestType -> () #

NFData TestTypeResponse 
Instance details

Defined in Amazonka.CloudFormation.TestType

Methods

rnf :: TestTypeResponse -> () #

NFData AccountFilterType 
Instance details

Defined in Amazonka.CloudFormation.Types.AccountFilterType

Methods

rnf :: AccountFilterType -> () #

NFData AccountGateResult 
Instance details

Defined in Amazonka.CloudFormation.Types.AccountGateResult

Methods

rnf :: AccountGateResult -> () #

NFData AccountGateStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.AccountGateStatus

Methods

rnf :: AccountGateStatus -> () #

NFData AccountLimit 
Instance details

Defined in Amazonka.CloudFormation.Types.AccountLimit

Methods

rnf :: AccountLimit -> () #

NFData AutoDeployment 
Instance details

Defined in Amazonka.CloudFormation.Types.AutoDeployment

Methods

rnf :: AutoDeployment -> () #

NFData BatchDescribeTypeConfigurationsError 
Instance details

Defined in Amazonka.CloudFormation.Types.BatchDescribeTypeConfigurationsError

NFData CallAs 
Instance details

Defined in Amazonka.CloudFormation.Types.CallAs

Methods

rnf :: CallAs -> () #

NFData Capability 
Instance details

Defined in Amazonka.CloudFormation.Types.Capability

Methods

rnf :: Capability -> () #

NFData Category 
Instance details

Defined in Amazonka.CloudFormation.Types.Category

Methods

rnf :: Category -> () #

NFData Change 
Instance details

Defined in Amazonka.CloudFormation.Types.Change

Methods

rnf :: Change -> () #

NFData ChangeAction 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeAction

Methods

rnf :: ChangeAction -> () #

NFData ChangeSetHook 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetHook

Methods

rnf :: ChangeSetHook -> () #

NFData ChangeSetHookResourceTargetDetails 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetHookResourceTargetDetails

NFData ChangeSetHookTargetDetails 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetHookTargetDetails

NFData ChangeSetHooksStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetHooksStatus

Methods

rnf :: ChangeSetHooksStatus -> () #

NFData ChangeSetStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetStatus

Methods

rnf :: ChangeSetStatus -> () #

NFData ChangeSetSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetSummary

Methods

rnf :: ChangeSetSummary -> () #

NFData ChangeSetType 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSetType

Methods

rnf :: ChangeSetType -> () #

NFData ChangeSource 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeSource

Methods

rnf :: ChangeSource -> () #

NFData ChangeType 
Instance details

Defined in Amazonka.CloudFormation.Types.ChangeType

Methods

rnf :: ChangeType -> () #

NFData DeploymentTargets 
Instance details

Defined in Amazonka.CloudFormation.Types.DeploymentTargets

Methods

rnf :: DeploymentTargets -> () #

NFData DeprecatedStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.DeprecatedStatus

Methods

rnf :: DeprecatedStatus -> () #

NFData DifferenceType 
Instance details

Defined in Amazonka.CloudFormation.Types.DifferenceType

Methods

rnf :: DifferenceType -> () #

NFData EvaluationType 
Instance details

Defined in Amazonka.CloudFormation.Types.EvaluationType

Methods

rnf :: EvaluationType -> () #

NFData ExecutionStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.ExecutionStatus

Methods

rnf :: ExecutionStatus -> () #

NFData Export 
Instance details

Defined in Amazonka.CloudFormation.Types.Export

Methods

rnf :: Export -> () #

NFData HandlerErrorCode 
Instance details

Defined in Amazonka.CloudFormation.Types.HandlerErrorCode

Methods

rnf :: HandlerErrorCode -> () #

NFData HookFailureMode 
Instance details

Defined in Amazonka.CloudFormation.Types.HookFailureMode

Methods

rnf :: HookFailureMode -> () #

NFData HookInvocationPoint 
Instance details

Defined in Amazonka.CloudFormation.Types.HookInvocationPoint

Methods

rnf :: HookInvocationPoint -> () #

NFData HookStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.HookStatus

Methods

rnf :: HookStatus -> () #

NFData HookTargetType 
Instance details

Defined in Amazonka.CloudFormation.Types.HookTargetType

Methods

rnf :: HookTargetType -> () #

NFData IdentityProvider 
Instance details

Defined in Amazonka.CloudFormation.Types.IdentityProvider

Methods

rnf :: IdentityProvider -> () #

NFData LoggingConfig 
Instance details

Defined in Amazonka.CloudFormation.Types.LoggingConfig

Methods

rnf :: LoggingConfig -> () #

NFData ManagedExecution 
Instance details

Defined in Amazonka.CloudFormation.Types.ManagedExecution

Methods

rnf :: ManagedExecution -> () #

NFData ModuleInfo 
Instance details

Defined in Amazonka.CloudFormation.Types.ModuleInfo

Methods

rnf :: ModuleInfo -> () #

NFData OnFailure 
Instance details

Defined in Amazonka.CloudFormation.Types.OnFailure

Methods

rnf :: OnFailure -> () #

NFData OperationResultFilter 
Instance details

Defined in Amazonka.CloudFormation.Types.OperationResultFilter

Methods

rnf :: OperationResultFilter -> () #

NFData OperationResultFilterName 
Instance details

Defined in Amazonka.CloudFormation.Types.OperationResultFilterName

NFData OperationStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.OperationStatus

Methods

rnf :: OperationStatus -> () #

NFData Output 
Instance details

Defined in Amazonka.CloudFormation.Types.Output

Methods

rnf :: Output -> () #

NFData Parameter 
Instance details

Defined in Amazonka.CloudFormation.Types.Parameter

Methods

rnf :: Parameter -> () #

NFData ParameterConstraints 
Instance details

Defined in Amazonka.CloudFormation.Types.ParameterConstraints

Methods

rnf :: ParameterConstraints -> () #

NFData ParameterDeclaration 
Instance details

Defined in Amazonka.CloudFormation.Types.ParameterDeclaration

Methods

rnf :: ParameterDeclaration -> () #

NFData PermissionModels 
Instance details

Defined in Amazonka.CloudFormation.Types.PermissionModels

Methods

rnf :: PermissionModels -> () #

NFData PhysicalResourceIdContextKeyValuePair 
Instance details

Defined in Amazonka.CloudFormation.Types.PhysicalResourceIdContextKeyValuePair

NFData PropertyDifference 
Instance details

Defined in Amazonka.CloudFormation.Types.PropertyDifference

Methods

rnf :: PropertyDifference -> () #

NFData ProvisioningType 
Instance details

Defined in Amazonka.CloudFormation.Types.ProvisioningType

Methods

rnf :: ProvisioningType -> () #

NFData PublisherStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.PublisherStatus

Methods

rnf :: PublisherStatus -> () #

NFData RegionConcurrencyType 
Instance details

Defined in Amazonka.CloudFormation.Types.RegionConcurrencyType

Methods

rnf :: RegionConcurrencyType -> () #

NFData RegistrationStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.RegistrationStatus

Methods

rnf :: RegistrationStatus -> () #

NFData RegistryType 
Instance details

Defined in Amazonka.CloudFormation.Types.RegistryType

Methods

rnf :: RegistryType -> () #

NFData Replacement 
Instance details

Defined in Amazonka.CloudFormation.Types.Replacement

Methods

rnf :: Replacement -> () #

NFData RequiredActivatedType 
Instance details

Defined in Amazonka.CloudFormation.Types.RequiredActivatedType

Methods

rnf :: RequiredActivatedType -> () #

NFData RequiresRecreation 
Instance details

Defined in Amazonka.CloudFormation.Types.RequiresRecreation

Methods

rnf :: RequiresRecreation -> () #

NFData ResourceAttribute 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceAttribute

Methods

rnf :: ResourceAttribute -> () #

NFData ResourceChange 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceChange

Methods

rnf :: ResourceChange -> () #

NFData ResourceChangeDetail 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceChangeDetail

Methods

rnf :: ResourceChangeDetail -> () #

NFData ResourceIdentifierSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceIdentifierSummary

NFData ResourceSignalStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceSignalStatus

Methods

rnf :: ResourceSignalStatus -> () #

NFData ResourceStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceStatus

Methods

rnf :: ResourceStatus -> () #

NFData ResourceTargetDefinition 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceTargetDefinition

NFData ResourceToImport 
Instance details

Defined in Amazonka.CloudFormation.Types.ResourceToImport

Methods

rnf :: ResourceToImport -> () #

NFData RollbackConfiguration 
Instance details

Defined in Amazonka.CloudFormation.Types.RollbackConfiguration

Methods

rnf :: RollbackConfiguration -> () #

NFData RollbackTrigger 
Instance details

Defined in Amazonka.CloudFormation.Types.RollbackTrigger

Methods

rnf :: RollbackTrigger -> () #

NFData Stack 
Instance details

Defined in Amazonka.CloudFormation.Types.Stack

Methods

rnf :: Stack -> () #

NFData StackDriftDetectionStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackDriftDetectionStatus

NFData StackDriftInformation 
Instance details

Defined in Amazonka.CloudFormation.Types.StackDriftInformation

Methods

rnf :: StackDriftInformation -> () #

NFData StackDriftInformationSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackDriftInformationSummary

NFData StackDriftStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackDriftStatus

Methods

rnf :: StackDriftStatus -> () #

NFData StackEvent 
Instance details

Defined in Amazonka.CloudFormation.Types.StackEvent

Methods

rnf :: StackEvent -> () #

NFData StackInstance 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstance

Methods

rnf :: StackInstance -> () #

NFData StackInstanceComprehensiveStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstanceComprehensiveStatus

NFData StackInstanceDetailedStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstanceDetailedStatus

NFData StackInstanceFilter 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstanceFilter

Methods

rnf :: StackInstanceFilter -> () #

NFData StackInstanceFilterName 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstanceFilterName

Methods

rnf :: StackInstanceFilterName -> () #

NFData StackInstanceStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstanceStatus

Methods

rnf :: StackInstanceStatus -> () #

NFData StackInstanceSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackInstanceSummary

Methods

rnf :: StackInstanceSummary -> () #

NFData StackResource 
Instance details

Defined in Amazonka.CloudFormation.Types.StackResource

Methods

rnf :: StackResource -> () #

NFData StackResourceDetail 
Instance details

Defined in Amazonka.CloudFormation.Types.StackResourceDetail

Methods

rnf :: StackResourceDetail -> () #

NFData StackResourceDrift 
Instance details

Defined in Amazonka.CloudFormation.Types.StackResourceDrift

Methods

rnf :: StackResourceDrift -> () #

NFData StackResourceDriftInformation 
Instance details

Defined in Amazonka.CloudFormation.Types.StackResourceDriftInformation

NFData StackResourceDriftInformationSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackResourceDriftInformationSummary

NFData StackResourceDriftStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackResourceDriftStatus

NFData StackResourceSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackResourceSummary

Methods

rnf :: StackResourceSummary -> () #

NFData StackSet 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSet

Methods

rnf :: StackSet -> () #

NFData StackSetDriftDetectionDetails 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetDriftDetectionDetails

NFData StackSetDriftDetectionStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetDriftDetectionStatus

NFData StackSetDriftStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetDriftStatus

Methods

rnf :: StackSetDriftStatus -> () #

NFData StackSetOperation 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperation

Methods

rnf :: StackSetOperation -> () #

NFData StackSetOperationAction 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationAction

Methods

rnf :: StackSetOperationAction -> () #

NFData StackSetOperationPreferences 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationPreferences

NFData StackSetOperationResultStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationResultStatus

NFData StackSetOperationResultSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationResultSummary

NFData StackSetOperationStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationStatus

Methods

rnf :: StackSetOperationStatus -> () #

NFData StackSetOperationStatusDetails 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationStatusDetails

NFData StackSetOperationSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetOperationSummary

NFData StackSetStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetStatus

Methods

rnf :: StackSetStatus -> () #

NFData StackSetSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSetSummary

Methods

rnf :: StackSetSummary -> () #

NFData StackStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.StackStatus

Methods

rnf :: StackStatus -> () #

NFData StackSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.StackSummary

Methods

rnf :: StackSummary -> () #

NFData Tag 
Instance details

Defined in Amazonka.CloudFormation.Types.Tag

Methods

rnf :: Tag -> () #

NFData TemplateParameter 
Instance details

Defined in Amazonka.CloudFormation.Types.TemplateParameter

Methods

rnf :: TemplateParameter -> () #

NFData TemplateStage 
Instance details

Defined in Amazonka.CloudFormation.Types.TemplateStage

Methods

rnf :: TemplateStage -> () #

NFData ThirdPartyType 
Instance details

Defined in Amazonka.CloudFormation.Types.ThirdPartyType

Methods

rnf :: ThirdPartyType -> () #

NFData TypeConfigurationDetails 
Instance details

Defined in Amazonka.CloudFormation.Types.TypeConfigurationDetails

NFData TypeConfigurationIdentifier 
Instance details

Defined in Amazonka.CloudFormation.Types.TypeConfigurationIdentifier

NFData TypeFilters 
Instance details

Defined in Amazonka.CloudFormation.Types.TypeFilters

Methods

rnf :: TypeFilters -> () #

NFData TypeSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.TypeSummary

Methods

rnf :: TypeSummary -> () #

NFData TypeTestsStatus 
Instance details

Defined in Amazonka.CloudFormation.Types.TypeTestsStatus

Methods

rnf :: TypeTestsStatus -> () #

NFData TypeVersionSummary 
Instance details

Defined in Amazonka.CloudFormation.Types.TypeVersionSummary

Methods

rnf :: TypeVersionSummary -> () #

NFData VersionBump 
Instance details

Defined in Amazonka.CloudFormation.Types.VersionBump

Methods

rnf :: VersionBump -> () #

NFData Visibility 
Instance details

Defined in Amazonka.CloudFormation.Types.Visibility

Methods

rnf :: Visibility -> () #

NFData UpdateStack 
Instance details

Defined in Amazonka.CloudFormation.UpdateStack

Methods

rnf :: UpdateStack -> () #

NFData UpdateStackResponse 
Instance details

Defined in Amazonka.CloudFormation.UpdateStack

Methods

rnf :: UpdateStackResponse -> () #

NFData UpdateStackInstances 
Instance details

Defined in Amazonka.CloudFormation.UpdateStackInstances

Methods

rnf :: UpdateStackInstances -> () #

NFData UpdateStackInstancesResponse 
Instance details

Defined in Amazonka.CloudFormation.UpdateStackInstances

NFData UpdateStackSet 
Instance details

Defined in Amazonka.CloudFormation.UpdateStackSet

Methods

rnf :: UpdateStackSet -> () #

NFData UpdateStackSetResponse 
Instance details

Defined in Amazonka.CloudFormation.UpdateStackSet

Methods

rnf :: UpdateStackSetResponse -> () #

NFData UpdateTerminationProtection 
Instance details

Defined in Amazonka.CloudFormation.UpdateTerminationProtection

NFData UpdateTerminationProtectionResponse 
Instance details

Defined in Amazonka.CloudFormation.UpdateTerminationProtection

NFData ValidateTemplate 
Instance details

Defined in Amazonka.CloudFormation.ValidateTemplate

Methods

rnf :: ValidateTemplate -> () #

NFData ValidateTemplateResponse 
Instance details

Defined in Amazonka.CloudFormation.ValidateTemplate

NFData Base64 
Instance details

Defined in Amazonka.Data.Base64

Methods

rnf :: Base64 -> () #

NFData AccessKey 
Instance details

Defined in Amazonka.Types

Methods

rnf :: AccessKey -> () #

NFData AuthEnv 
Instance details

Defined in Amazonka.Types

Methods

rnf :: AuthEnv -> () #

NFData Region 
Instance details

Defined in Amazonka.Types

Methods

rnf :: Region -> () #

NFData Seconds 
Instance details

Defined in Amazonka.Types

Methods

rnf :: Seconds -> () #

NFData SecretKey 
Instance details

Defined in Amazonka.Types

Methods

rnf :: SecretKey -> () #

NFData SessionToken 
Instance details

Defined in Amazonka.Types

Methods

rnf :: SessionToken -> () #

NFData DescribeAvailabilityZones 
Instance details

Defined in Amazonka.EC2.DescribeAvailabilityZones

NFData DescribeAvailabilityZonesResponse 
Instance details

Defined in Amazonka.EC2.DescribeAvailabilityZones

NFData AcceleratorCount 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorCount

Methods

rnf :: AcceleratorCount -> () #

NFData AcceleratorCountRequest 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorCountRequest

Methods

rnf :: AcceleratorCountRequest -> () #

NFData AcceleratorManufacturer 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorManufacturer

Methods

rnf :: AcceleratorManufacturer -> () #

NFData AcceleratorName 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorName

Methods

rnf :: AcceleratorName -> () #

NFData AcceleratorTotalMemoryMiB 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorTotalMemoryMiB

NFData AcceleratorTotalMemoryMiBRequest 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorTotalMemoryMiBRequest

NFData AcceleratorType 
Instance details

Defined in Amazonka.EC2.Types.AcceleratorType

Methods

rnf :: AcceleratorType -> () #

NFData AccessScopeAnalysisFinding 
Instance details

Defined in Amazonka.EC2.Types.AccessScopeAnalysisFinding

NFData AccessScopePath 
Instance details

Defined in Amazonka.EC2.Types.AccessScopePath

Methods

rnf :: AccessScopePath -> () #

NFData AccessScopePathRequest 
Instance details

Defined in Amazonka.EC2.Types.AccessScopePathRequest

Methods

rnf :: AccessScopePathRequest -> () #

NFData AccountAttribute 
Instance details

Defined in Amazonka.EC2.Types.AccountAttribute

Methods

rnf :: AccountAttribute -> () #

NFData AccountAttributeName 
Instance details

Defined in Amazonka.EC2.Types.AccountAttributeName

Methods

rnf :: AccountAttributeName -> () #

NFData AccountAttributeValue 
Instance details

Defined in Amazonka.EC2.Types.AccountAttributeValue

Methods

rnf :: AccountAttributeValue -> () #

NFData ActiveInstance 
Instance details

Defined in Amazonka.EC2.Types.ActiveInstance

Methods

rnf :: ActiveInstance -> () #

NFData ActivityStatus 
Instance details

Defined in Amazonka.EC2.Types.ActivityStatus

Methods

rnf :: ActivityStatus -> () #

NFData AddIpamOperatingRegion 
Instance details

Defined in Amazonka.EC2.Types.AddIpamOperatingRegion

Methods

rnf :: AddIpamOperatingRegion -> () #

NFData AddPrefixListEntry 
Instance details

Defined in Amazonka.EC2.Types.AddPrefixListEntry

Methods

rnf :: AddPrefixListEntry -> () #

NFData AddedPrincipal 
Instance details

Defined in Amazonka.EC2.Types.AddedPrincipal

Methods

rnf :: AddedPrincipal -> () #

NFData AdditionalDetail 
Instance details

Defined in Amazonka.EC2.Types.AdditionalDetail

Methods

rnf :: AdditionalDetail -> () #

NFData Address 
Instance details

Defined in Amazonka.EC2.Types.Address

Methods

rnf :: Address -> () #

NFData AddressAttribute 
Instance details

Defined in Amazonka.EC2.Types.AddressAttribute

Methods

rnf :: AddressAttribute -> () #

NFData AddressAttributeName 
Instance details

Defined in Amazonka.EC2.Types.AddressAttributeName

Methods

rnf :: AddressAttributeName -> () #

NFData AddressFamily 
Instance details

Defined in Amazonka.EC2.Types.AddressFamily

Methods

rnf :: AddressFamily -> () #

NFData AddressStatus 
Instance details

Defined in Amazonka.EC2.Types.AddressStatus

Methods

rnf :: AddressStatus -> () #

NFData AddressTransfer 
Instance details

Defined in Amazonka.EC2.Types.AddressTransfer

Methods

rnf :: AddressTransfer -> () #

NFData AddressTransferStatus 
Instance details

Defined in Amazonka.EC2.Types.AddressTransferStatus

Methods

rnf :: AddressTransferStatus -> () #

NFData Affinity 
Instance details

Defined in Amazonka.EC2.Types.Affinity

Methods

rnf :: Affinity -> () #

NFData AllocationState 
Instance details

Defined in Amazonka.EC2.Types.AllocationState

Methods

rnf :: AllocationState -> () #

NFData AllocationStrategy 
Instance details

Defined in Amazonka.EC2.Types.AllocationStrategy

Methods

rnf :: AllocationStrategy -> () #

NFData AllocationType 
Instance details

Defined in Amazonka.EC2.Types.AllocationType

Methods

rnf :: AllocationType -> () #

NFData AllowedPrincipal 
Instance details

Defined in Amazonka.EC2.Types.AllowedPrincipal

Methods

rnf :: AllowedPrincipal -> () #

NFData AllowsMultipleInstanceTypes 
Instance details

Defined in Amazonka.EC2.Types.AllowsMultipleInstanceTypes

NFData AlternatePathHint 
Instance details

Defined in Amazonka.EC2.Types.AlternatePathHint

Methods

rnf :: AlternatePathHint -> () #

NFData AnalysisAclRule 
Instance details

Defined in Amazonka.EC2.Types.AnalysisAclRule

Methods

rnf :: AnalysisAclRule -> () #

NFData AnalysisComponent 
Instance details

Defined in Amazonka.EC2.Types.AnalysisComponent

Methods

rnf :: AnalysisComponent -> () #

NFData AnalysisLoadBalancerListener 
Instance details

Defined in Amazonka.EC2.Types.AnalysisLoadBalancerListener

NFData AnalysisLoadBalancerTarget 
Instance details

Defined in Amazonka.EC2.Types.AnalysisLoadBalancerTarget

NFData AnalysisPacketHeader 
Instance details

Defined in Amazonka.EC2.Types.AnalysisPacketHeader

Methods

rnf :: AnalysisPacketHeader -> () #

NFData AnalysisRouteTableRoute 
Instance details

Defined in Amazonka.EC2.Types.AnalysisRouteTableRoute

Methods

rnf :: AnalysisRouteTableRoute -> () #

NFData AnalysisSecurityGroupRule 
Instance details

Defined in Amazonka.EC2.Types.AnalysisSecurityGroupRule

NFData AnalysisStatus 
Instance details

Defined in Amazonka.EC2.Types.AnalysisStatus

Methods

rnf :: AnalysisStatus -> () #

NFData ApplianceModeSupportValue 
Instance details

Defined in Amazonka.EC2.Types.ApplianceModeSupportValue

NFData ArchitectureType 
Instance details

Defined in Amazonka.EC2.Types.ArchitectureType

Methods

rnf :: ArchitectureType -> () #

NFData ArchitectureValues 
Instance details

Defined in Amazonka.EC2.Types.ArchitectureValues

Methods

rnf :: ArchitectureValues -> () #

NFData AssignedPrivateIpAddress 
Instance details

Defined in Amazonka.EC2.Types.AssignedPrivateIpAddress

NFData AssociatedNetworkType 
Instance details

Defined in Amazonka.EC2.Types.AssociatedNetworkType

Methods

rnf :: AssociatedNetworkType -> () #

NFData AssociatedRole 
Instance details

Defined in Amazonka.EC2.Types.AssociatedRole

Methods

rnf :: AssociatedRole -> () #

NFData AssociatedTargetNetwork 
Instance details

Defined in Amazonka.EC2.Types.AssociatedTargetNetwork

Methods

rnf :: AssociatedTargetNetwork -> () #

NFData AssociationStatus 
Instance details

Defined in Amazonka.EC2.Types.AssociationStatus

Methods

rnf :: AssociationStatus -> () #

NFData AssociationStatusCode 
Instance details

Defined in Amazonka.EC2.Types.AssociationStatusCode

Methods

rnf :: AssociationStatusCode -> () #

NFData AthenaIntegration 
Instance details

Defined in Amazonka.EC2.Types.AthenaIntegration

Methods

rnf :: AthenaIntegration -> () #

NFData AttachmentEnaSrdSpecification 
Instance details

Defined in Amazonka.EC2.Types.AttachmentEnaSrdSpecification

NFData AttachmentEnaSrdUdpSpecification 
Instance details

Defined in Amazonka.EC2.Types.AttachmentEnaSrdUdpSpecification

NFData AttachmentStatus 
Instance details

Defined in Amazonka.EC2.Types.AttachmentStatus

Methods

rnf :: AttachmentStatus -> () #

NFData AttributeBooleanValue 
Instance details

Defined in Amazonka.EC2.Types.AttributeBooleanValue

Methods

rnf :: AttributeBooleanValue -> () #

NFData AttributeValue 
Instance details

Defined in Amazonka.EC2.Types.AttributeValue

Methods

rnf :: AttributeValue -> () #

NFData AuthorizationRule 
Instance details

Defined in Amazonka.EC2.Types.AuthorizationRule

Methods

rnf :: AuthorizationRule -> () #

NFData AutoAcceptSharedAssociationsValue 
Instance details

Defined in Amazonka.EC2.Types.AutoAcceptSharedAssociationsValue

NFData AutoAcceptSharedAttachmentsValue 
Instance details

Defined in Amazonka.EC2.Types.AutoAcceptSharedAttachmentsValue

NFData AutoPlacement 
Instance details

Defined in Amazonka.EC2.Types.AutoPlacement

Methods

rnf :: AutoPlacement -> () #

NFData AvailabilityZone 
Instance details

Defined in Amazonka.EC2.Types.AvailabilityZone

Methods

rnf :: AvailabilityZone -> () #

NFData AvailabilityZoneMessage 
Instance details

Defined in Amazonka.EC2.Types.AvailabilityZoneMessage

Methods

rnf :: AvailabilityZoneMessage -> () #

NFData AvailabilityZoneOptInStatus 
Instance details

Defined in Amazonka.EC2.Types.AvailabilityZoneOptInStatus

NFData AvailabilityZoneState 
Instance details

Defined in Amazonka.EC2.Types.AvailabilityZoneState

Methods

rnf :: AvailabilityZoneState -> () #

NFData AvailableCapacity 
Instance details

Defined in Amazonka.EC2.Types.AvailableCapacity

Methods

rnf :: AvailableCapacity -> () #

NFData BareMetal 
Instance details

Defined in Amazonka.EC2.Types.BareMetal

Methods

rnf :: BareMetal -> () #

NFData BaselineEbsBandwidthMbps 
Instance details

Defined in Amazonka.EC2.Types.BaselineEbsBandwidthMbps

NFData BaselineEbsBandwidthMbpsRequest 
Instance details

Defined in Amazonka.EC2.Types.BaselineEbsBandwidthMbpsRequest

NFData BatchState 
Instance details

Defined in Amazonka.EC2.Types.BatchState

Methods

rnf :: BatchState -> () #

NFData BgpStatus 
Instance details

Defined in Amazonka.EC2.Types.BgpStatus

Methods

rnf :: BgpStatus -> () #

NFData BlobAttributeValue 
Instance details

Defined in Amazonka.EC2.Types.BlobAttributeValue

Methods

rnf :: BlobAttributeValue -> () #

NFData BlockDeviceMapping 
Instance details

Defined in Amazonka.EC2.Types.BlockDeviceMapping

Methods

rnf :: BlockDeviceMapping -> () #

NFData BootModeType 
Instance details

Defined in Amazonka.EC2.Types.BootModeType

Methods

rnf :: BootModeType -> () #

NFData BootModeValues 
Instance details

Defined in Amazonka.EC2.Types.BootModeValues

Methods

rnf :: BootModeValues -> () #

NFData BundleTask 
Instance details

Defined in Amazonka.EC2.Types.BundleTask

Methods

rnf :: BundleTask -> () #

NFData BundleTaskError 
Instance details

Defined in Amazonka.EC2.Types.BundleTaskError

Methods

rnf :: BundleTaskError -> () #

NFData BundleTaskState 
Instance details

Defined in Amazonka.EC2.Types.BundleTaskState

Methods

rnf :: BundleTaskState -> () #

NFData BurstablePerformance 
Instance details

Defined in Amazonka.EC2.Types.BurstablePerformance

Methods

rnf :: BurstablePerformance -> () #

NFData ByoipCidr 
Instance details

Defined in Amazonka.EC2.Types.ByoipCidr

Methods

rnf :: ByoipCidr -> () #

NFData ByoipCidrState 
Instance details

Defined in Amazonka.EC2.Types.ByoipCidrState

Methods

rnf :: ByoipCidrState -> () #

NFData CancelBatchErrorCode 
Instance details

Defined in Amazonka.EC2.Types.CancelBatchErrorCode

Methods

rnf :: CancelBatchErrorCode -> () #

NFData CancelCapacityReservationFleetError 
Instance details

Defined in Amazonka.EC2.Types.CancelCapacityReservationFleetError

NFData CancelSpotFleetRequestsError 
Instance details

Defined in Amazonka.EC2.Types.CancelSpotFleetRequestsError

NFData CancelSpotFleetRequestsErrorItem 
Instance details

Defined in Amazonka.EC2.Types.CancelSpotFleetRequestsErrorItem

NFData CancelSpotFleetRequestsSuccessItem 
Instance details

Defined in Amazonka.EC2.Types.CancelSpotFleetRequestsSuccessItem

NFData CancelSpotInstanceRequestState 
Instance details

Defined in Amazonka.EC2.Types.CancelSpotInstanceRequestState

NFData CancelledSpotInstanceRequest 
Instance details

Defined in Amazonka.EC2.Types.CancelledSpotInstanceRequest

NFData CapacityAllocation 
Instance details

Defined in Amazonka.EC2.Types.CapacityAllocation

Methods

rnf :: CapacityAllocation -> () #

NFData CapacityReservation 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservation

Methods

rnf :: CapacityReservation -> () #

NFData CapacityReservationFleet 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationFleet

NFData CapacityReservationFleetCancellationState 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationFleetCancellationState

NFData CapacityReservationFleetState 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationFleetState

NFData CapacityReservationGroup 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationGroup

NFData CapacityReservationInstancePlatform 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationInstancePlatform

NFData CapacityReservationOptions 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationOptions

NFData CapacityReservationOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationOptionsRequest

NFData CapacityReservationPreference 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationPreference

NFData CapacityReservationSpecification 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationSpecification

NFData CapacityReservationSpecificationResponse 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationSpecificationResponse

NFData CapacityReservationState 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationState

NFData CapacityReservationTarget 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationTarget

NFData CapacityReservationTargetResponse 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationTargetResponse

NFData CapacityReservationTenancy 
Instance details

Defined in Amazonka.EC2.Types.CapacityReservationTenancy

NFData CarrierGateway 
Instance details

Defined in Amazonka.EC2.Types.CarrierGateway

Methods

rnf :: CarrierGateway -> () #

NFData CarrierGatewayState 
Instance details

Defined in Amazonka.EC2.Types.CarrierGatewayState

Methods

rnf :: CarrierGatewayState -> () #

NFData CertificateAuthentication 
Instance details

Defined in Amazonka.EC2.Types.CertificateAuthentication

NFData CertificateAuthenticationRequest 
Instance details

Defined in Amazonka.EC2.Types.CertificateAuthenticationRequest

NFData CidrAuthorizationContext 
Instance details

Defined in Amazonka.EC2.Types.CidrAuthorizationContext

NFData CidrBlock 
Instance details

Defined in Amazonka.EC2.Types.CidrBlock

Methods

rnf :: CidrBlock -> () #

NFData ClassicLinkDnsSupport 
Instance details

Defined in Amazonka.EC2.Types.ClassicLinkDnsSupport

Methods

rnf :: ClassicLinkDnsSupport -> () #

NFData ClassicLinkInstance 
Instance details

Defined in Amazonka.EC2.Types.ClassicLinkInstance

Methods

rnf :: ClassicLinkInstance -> () #

NFData ClassicLoadBalancer 
Instance details

Defined in Amazonka.EC2.Types.ClassicLoadBalancer

Methods

rnf :: ClassicLoadBalancer -> () #

NFData ClassicLoadBalancersConfig 
Instance details

Defined in Amazonka.EC2.Types.ClassicLoadBalancersConfig

NFData ClientCertificateRevocationListStatus 
Instance details

Defined in Amazonka.EC2.Types.ClientCertificateRevocationListStatus

NFData ClientCertificateRevocationListStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientCertificateRevocationListStatusCode

NFData ClientConnectOptions 
Instance details

Defined in Amazonka.EC2.Types.ClientConnectOptions

Methods

rnf :: ClientConnectOptions -> () #

NFData ClientConnectResponseOptions 
Instance details

Defined in Amazonka.EC2.Types.ClientConnectResponseOptions

NFData ClientData 
Instance details

Defined in Amazonka.EC2.Types.ClientData

Methods

rnf :: ClientData -> () #

NFData ClientLoginBannerOptions 
Instance details

Defined in Amazonka.EC2.Types.ClientLoginBannerOptions

NFData ClientLoginBannerResponseOptions 
Instance details

Defined in Amazonka.EC2.Types.ClientLoginBannerResponseOptions

NFData ClientVpnAuthentication 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnAuthentication

Methods

rnf :: ClientVpnAuthentication -> () #

NFData ClientVpnAuthenticationRequest 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnAuthenticationRequest

NFData ClientVpnAuthenticationType 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnAuthenticationType

NFData ClientVpnAuthorizationRuleStatus 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnAuthorizationRuleStatus

NFData ClientVpnAuthorizationRuleStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnAuthorizationRuleStatusCode

NFData ClientVpnConnection 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnConnection

Methods

rnf :: ClientVpnConnection -> () #

NFData ClientVpnConnectionStatus 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnConnectionStatus

NFData ClientVpnConnectionStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnConnectionStatusCode

NFData ClientVpnEndpoint 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnEndpoint

Methods

rnf :: ClientVpnEndpoint -> () #

NFData ClientVpnEndpointAttributeStatus 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnEndpointAttributeStatus

NFData ClientVpnEndpointAttributeStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnEndpointAttributeStatusCode

NFData ClientVpnEndpointStatus 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnEndpointStatus

Methods

rnf :: ClientVpnEndpointStatus -> () #

NFData ClientVpnEndpointStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnEndpointStatusCode

NFData ClientVpnRoute 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnRoute

Methods

rnf :: ClientVpnRoute -> () #

NFData ClientVpnRouteStatus 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnRouteStatus

Methods

rnf :: ClientVpnRouteStatus -> () #

NFData ClientVpnRouteStatusCode 
Instance details

Defined in Amazonka.EC2.Types.ClientVpnRouteStatusCode

NFData CloudWatchLogOptions 
Instance details

Defined in Amazonka.EC2.Types.CloudWatchLogOptions

Methods

rnf :: CloudWatchLogOptions -> () #

NFData CloudWatchLogOptionsSpecification 
Instance details

Defined in Amazonka.EC2.Types.CloudWatchLogOptionsSpecification

NFData CoipAddressUsage 
Instance details

Defined in Amazonka.EC2.Types.CoipAddressUsage

Methods

rnf :: CoipAddressUsage -> () #

NFData CoipCidr 
Instance details

Defined in Amazonka.EC2.Types.CoipCidr

Methods

rnf :: CoipCidr -> () #

NFData CoipPool 
Instance details

Defined in Amazonka.EC2.Types.CoipPool

Methods

rnf :: CoipPool -> () #

NFData ConnectionLogOptions 
Instance details

Defined in Amazonka.EC2.Types.ConnectionLogOptions

Methods

rnf :: ConnectionLogOptions -> () #

NFData ConnectionLogResponseOptions 
Instance details

Defined in Amazonka.EC2.Types.ConnectionLogResponseOptions

NFData ConnectionNotification 
Instance details

Defined in Amazonka.EC2.Types.ConnectionNotification

Methods

rnf :: ConnectionNotification -> () #

NFData ConnectionNotificationState 
Instance details

Defined in Amazonka.EC2.Types.ConnectionNotificationState

NFData ConnectionNotificationType 
Instance details

Defined in Amazonka.EC2.Types.ConnectionNotificationType

NFData ConnectivityType 
Instance details

Defined in Amazonka.EC2.Types.ConnectivityType

Methods

rnf :: ConnectivityType -> () #

NFData ContainerFormat 
Instance details

Defined in Amazonka.EC2.Types.ContainerFormat

Methods

rnf :: ContainerFormat -> () #

NFData ConversionTask 
Instance details

Defined in Amazonka.EC2.Types.ConversionTask

Methods

rnf :: ConversionTask -> () #

NFData ConversionTaskState 
Instance details

Defined in Amazonka.EC2.Types.ConversionTaskState

Methods

rnf :: ConversionTaskState -> () #

NFData CopyTagsFromSource 
Instance details

Defined in Amazonka.EC2.Types.CopyTagsFromSource

Methods

rnf :: CopyTagsFromSource -> () #

NFData CpuManufacturer 
Instance details

Defined in Amazonka.EC2.Types.CpuManufacturer

Methods

rnf :: CpuManufacturer -> () #

NFData CpuOptions 
Instance details

Defined in Amazonka.EC2.Types.CpuOptions

Methods

rnf :: CpuOptions -> () #

NFData CpuOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.CpuOptionsRequest

Methods

rnf :: CpuOptionsRequest -> () #

NFData CreateFleetError 
Instance details

Defined in Amazonka.EC2.Types.CreateFleetError

Methods

rnf :: CreateFleetError -> () #

NFData CreateFleetInstance 
Instance details

Defined in Amazonka.EC2.Types.CreateFleetInstance

Methods

rnf :: CreateFleetInstance -> () #

NFData CreateTransitGatewayConnectRequestOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateTransitGatewayConnectRequestOptions

NFData CreateTransitGatewayMulticastDomainRequestOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateTransitGatewayMulticastDomainRequestOptions

NFData CreateTransitGatewayPeeringAttachmentRequestOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateTransitGatewayPeeringAttachmentRequestOptions

NFData CreateTransitGatewayVpcAttachmentRequestOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateTransitGatewayVpcAttachmentRequestOptions

NFData CreateVerifiedAccessEndpointEniOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateVerifiedAccessEndpointEniOptions

NFData CreateVerifiedAccessEndpointLoadBalancerOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateVerifiedAccessEndpointLoadBalancerOptions

NFData CreateVerifiedAccessTrustProviderDeviceOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateVerifiedAccessTrustProviderDeviceOptions

NFData CreateVerifiedAccessTrustProviderOidcOptions 
Instance details

Defined in Amazonka.EC2.Types.CreateVerifiedAccessTrustProviderOidcOptions

NFData CreateVolumePermission 
Instance details

Defined in Amazonka.EC2.Types.CreateVolumePermission

Methods

rnf :: CreateVolumePermission -> () #

NFData CreateVolumePermissionModifications 
Instance details

Defined in Amazonka.EC2.Types.CreateVolumePermissionModifications

NFData CreditSpecification 
Instance details

Defined in Amazonka.EC2.Types.CreditSpecification

Methods

rnf :: CreditSpecification -> () #

NFData CreditSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.CreditSpecificationRequest

NFData CurrencyCodeValues 
Instance details

Defined in Amazonka.EC2.Types.CurrencyCodeValues

Methods

rnf :: CurrencyCodeValues -> () #

NFData CustomerGateway 
Instance details

Defined in Amazonka.EC2.Types.CustomerGateway

Methods

rnf :: CustomerGateway -> () #

NFData DataQuery 
Instance details

Defined in Amazonka.EC2.Types.DataQuery

Methods

rnf :: DataQuery -> () #

NFData DataResponse 
Instance details

Defined in Amazonka.EC2.Types.DataResponse

Methods

rnf :: DataResponse -> () #

NFData DatafeedSubscriptionState 
Instance details

Defined in Amazonka.EC2.Types.DatafeedSubscriptionState

NFData DefaultRouteTableAssociationValue 
Instance details

Defined in Amazonka.EC2.Types.DefaultRouteTableAssociationValue

NFData DefaultRouteTablePropagationValue 
Instance details

Defined in Amazonka.EC2.Types.DefaultRouteTablePropagationValue

NFData DefaultTargetCapacityType 
Instance details

Defined in Amazonka.EC2.Types.DefaultTargetCapacityType

NFData DeleteFleetError 
Instance details

Defined in Amazonka.EC2.Types.DeleteFleetError

Methods

rnf :: DeleteFleetError -> () #

NFData DeleteFleetErrorCode 
Instance details

Defined in Amazonka.EC2.Types.DeleteFleetErrorCode

Methods

rnf :: DeleteFleetErrorCode -> () #

NFData DeleteFleetErrorItem 
Instance details

Defined in Amazonka.EC2.Types.DeleteFleetErrorItem

Methods

rnf :: DeleteFleetErrorItem -> () #

NFData DeleteFleetSuccessItem 
Instance details

Defined in Amazonka.EC2.Types.DeleteFleetSuccessItem

Methods

rnf :: DeleteFleetSuccessItem -> () #

NFData DeleteLaunchTemplateVersionsResponseErrorItem 
Instance details

Defined in Amazonka.EC2.Types.DeleteLaunchTemplateVersionsResponseErrorItem

NFData DeleteLaunchTemplateVersionsResponseSuccessItem 
Instance details

Defined in Amazonka.EC2.Types.DeleteLaunchTemplateVersionsResponseSuccessItem

NFData DeleteQueuedReservedInstancesError 
Instance details

Defined in Amazonka.EC2.Types.DeleteQueuedReservedInstancesError

NFData DeleteQueuedReservedInstancesErrorCode 
Instance details

Defined in Amazonka.EC2.Types.DeleteQueuedReservedInstancesErrorCode

NFData DeregisterInstanceTagAttributeRequest 
Instance details

Defined in Amazonka.EC2.Types.DeregisterInstanceTagAttributeRequest

NFData DescribeFastLaunchImagesSuccessItem 
Instance details

Defined in Amazonka.EC2.Types.DescribeFastLaunchImagesSuccessItem

NFData DescribeFastSnapshotRestoreSuccessItem 
Instance details

Defined in Amazonka.EC2.Types.DescribeFastSnapshotRestoreSuccessItem

NFData DescribeFleetError 
Instance details

Defined in Amazonka.EC2.Types.DescribeFleetError

Methods

rnf :: DescribeFleetError -> () #

NFData DescribeFleetsInstances 
Instance details

Defined in Amazonka.EC2.Types.DescribeFleetsInstances

Methods

rnf :: DescribeFleetsInstances -> () #

NFData DestinationFileFormat 
Instance details

Defined in Amazonka.EC2.Types.DestinationFileFormat

Methods

rnf :: DestinationFileFormat -> () #

NFData DestinationOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.DestinationOptionsRequest

NFData DestinationOptionsResponse 
Instance details

Defined in Amazonka.EC2.Types.DestinationOptionsResponse

NFData DeviceOptions 
Instance details

Defined in Amazonka.EC2.Types.DeviceOptions

Methods

rnf :: DeviceOptions -> () #

NFData DeviceTrustProviderType 
Instance details

Defined in Amazonka.EC2.Types.DeviceTrustProviderType

Methods

rnf :: DeviceTrustProviderType -> () #

NFData DeviceType 
Instance details

Defined in Amazonka.EC2.Types.DeviceType

Methods

rnf :: DeviceType -> () #

NFData DhcpConfiguration 
Instance details

Defined in Amazonka.EC2.Types.DhcpConfiguration

Methods

rnf :: DhcpConfiguration -> () #

NFData DhcpOptions 
Instance details

Defined in Amazonka.EC2.Types.DhcpOptions

Methods

rnf :: DhcpOptions -> () #

NFData DirectoryServiceAuthentication 
Instance details

Defined in Amazonka.EC2.Types.DirectoryServiceAuthentication

NFData DirectoryServiceAuthenticationRequest 
Instance details

Defined in Amazonka.EC2.Types.DirectoryServiceAuthenticationRequest

NFData DisableFastSnapshotRestoreErrorItem 
Instance details

Defined in Amazonka.EC2.Types.DisableFastSnapshotRestoreErrorItem

NFData DisableFastSnapshotRestoreStateError 
Instance details

Defined in Amazonka.EC2.Types.DisableFastSnapshotRestoreStateError

NFData DisableFastSnapshotRestoreStateErrorItem 
Instance details

Defined in Amazonka.EC2.Types.DisableFastSnapshotRestoreStateErrorItem

NFData DisableFastSnapshotRestoreSuccessItem 
Instance details

Defined in Amazonka.EC2.Types.DisableFastSnapshotRestoreSuccessItem

NFData DiskImage 
Instance details

Defined in Amazonka.EC2.Types.DiskImage

Methods

rnf :: DiskImage -> () #

NFData DiskImageDescription 
Instance details

Defined in Amazonka.EC2.Types.DiskImageDescription

Methods

rnf :: DiskImageDescription -> () #

NFData DiskImageDetail 
Instance details

Defined in Amazonka.EC2.Types.DiskImageDetail

Methods

rnf :: DiskImageDetail -> () #

NFData DiskImageFormat 
Instance details

Defined in Amazonka.EC2.Types.DiskImageFormat

Methods

rnf :: DiskImageFormat -> () #

NFData DiskImageVolumeDescription 
Instance details

Defined in Amazonka.EC2.Types.DiskImageVolumeDescription

NFData DiskInfo 
Instance details

Defined in Amazonka.EC2.Types.DiskInfo

Methods

rnf :: DiskInfo -> () #

NFData DiskType 
Instance details

Defined in Amazonka.EC2.Types.DiskType

Methods

rnf :: DiskType -> () #

NFData DnsEntry 
Instance details

Defined in Amazonka.EC2.Types.DnsEntry

Methods

rnf :: DnsEntry -> () #

NFData DnsNameState 
Instance details

Defined in Amazonka.EC2.Types.DnsNameState

Methods

rnf :: DnsNameState -> () #

NFData DnsOptions 
Instance details

Defined in Amazonka.EC2.Types.DnsOptions

Methods

rnf :: DnsOptions -> () #

NFData DnsOptionsSpecification 
Instance details

Defined in Amazonka.EC2.Types.DnsOptionsSpecification

Methods

rnf :: DnsOptionsSpecification -> () #

NFData DnsRecordIpType 
Instance details

Defined in Amazonka.EC2.Types.DnsRecordIpType

Methods

rnf :: DnsRecordIpType -> () #

NFData DnsServersOptionsModifyStructure 
Instance details

Defined in Amazonka.EC2.Types.DnsServersOptionsModifyStructure

NFData DnsSupportValue 
Instance details

Defined in Amazonka.EC2.Types.DnsSupportValue

Methods

rnf :: DnsSupportValue -> () #

NFData DomainType 
Instance details

Defined in Amazonka.EC2.Types.DomainType

Methods

rnf :: DomainType -> () #

NFData DynamicRoutingValue 
Instance details

Defined in Amazonka.EC2.Types.DynamicRoutingValue

Methods

rnf :: DynamicRoutingValue -> () #

NFData EbsBlockDevice 
Instance details

Defined in Amazonka.EC2.Types.EbsBlockDevice

Methods

rnf :: EbsBlockDevice -> () #

NFData EbsEncryptionSupport 
Instance details

Defined in Amazonka.EC2.Types.EbsEncryptionSupport

Methods

rnf :: EbsEncryptionSupport -> () #

NFData EbsInfo 
Instance details

Defined in Amazonka.EC2.Types.EbsInfo

Methods

rnf :: EbsInfo -> () #

NFData EbsInstanceBlockDevice 
Instance details

Defined in Amazonka.EC2.Types.EbsInstanceBlockDevice

Methods

rnf :: EbsInstanceBlockDevice -> () #

NFData EbsInstanceBlockDeviceSpecification 
Instance details

Defined in Amazonka.EC2.Types.EbsInstanceBlockDeviceSpecification

NFData EbsNvmeSupport 
Instance details

Defined in Amazonka.EC2.Types.EbsNvmeSupport

Methods

rnf :: EbsNvmeSupport -> () #

NFData EbsOptimizedInfo 
Instance details

Defined in Amazonka.EC2.Types.EbsOptimizedInfo

Methods

rnf :: EbsOptimizedInfo -> () #

NFData EbsOptimizedSupport 
Instance details

Defined in Amazonka.EC2.Types.EbsOptimizedSupport

Methods

rnf :: EbsOptimizedSupport -> () #

NFData EfaInfo 
Instance details

Defined in Amazonka.EC2.Types.EfaInfo

Methods

rnf :: EfaInfo -> () #

NFData EgressOnlyInternetGateway 
Instance details

Defined in Amazonka.EC2.Types.EgressOnlyInternetGateway

NFData ElasticGpuAssociation 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpuAssociation

Methods

rnf :: ElasticGpuAssociation -> () #

NFData ElasticGpuHealth 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpuHealth

Methods

rnf :: ElasticGpuHealth -> () #

NFData ElasticGpuSpecification 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpuSpecification

Methods

rnf :: ElasticGpuSpecification -> () #

NFData ElasticGpuSpecificationResponse 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpuSpecificationResponse

NFData ElasticGpuState 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpuState

Methods

rnf :: ElasticGpuState -> () #

NFData ElasticGpuStatus 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpuStatus

Methods

rnf :: ElasticGpuStatus -> () #

NFData ElasticGpus 
Instance details

Defined in Amazonka.EC2.Types.ElasticGpus

Methods

rnf :: ElasticGpus -> () #

NFData ElasticInferenceAccelerator 
Instance details

Defined in Amazonka.EC2.Types.ElasticInferenceAccelerator

NFData ElasticInferenceAcceleratorAssociation 
Instance details

Defined in Amazonka.EC2.Types.ElasticInferenceAcceleratorAssociation

NFData EnaSrdSpecification 
Instance details

Defined in Amazonka.EC2.Types.EnaSrdSpecification

Methods

rnf :: EnaSrdSpecification -> () #

NFData EnaSrdUdpSpecification 
Instance details

Defined in Amazonka.EC2.Types.EnaSrdUdpSpecification

Methods

rnf :: EnaSrdUdpSpecification -> () #

NFData EnaSupport 
Instance details

Defined in Amazonka.EC2.Types.EnaSupport

Methods

rnf :: EnaSupport -> () #

NFData EnableFastSnapshotRestoreErrorItem 
Instance details

Defined in Amazonka.EC2.Types.EnableFastSnapshotRestoreErrorItem

NFData EnableFastSnapshotRestoreStateError 
Instance details

Defined in Amazonka.EC2.Types.EnableFastSnapshotRestoreStateError

NFData EnableFastSnapshotRestoreStateErrorItem 
Instance details

Defined in Amazonka.EC2.Types.EnableFastSnapshotRestoreStateErrorItem

NFData EnableFastSnapshotRestoreSuccessItem 
Instance details

Defined in Amazonka.EC2.Types.EnableFastSnapshotRestoreSuccessItem

NFData EnclaveOptions 
Instance details

Defined in Amazonka.EC2.Types.EnclaveOptions

Methods

rnf :: EnclaveOptions -> () #

NFData EnclaveOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.EnclaveOptionsRequest

Methods

rnf :: EnclaveOptionsRequest -> () #

NFData EndDateType 
Instance details

Defined in Amazonka.EC2.Types.EndDateType

Methods

rnf :: EndDateType -> () #

NFData EphemeralNvmeSupport 
Instance details

Defined in Amazonka.EC2.Types.EphemeralNvmeSupport

Methods

rnf :: EphemeralNvmeSupport -> () #

NFData EventCode 
Instance details

Defined in Amazonka.EC2.Types.EventCode

Methods

rnf :: EventCode -> () #

NFData EventInformation 
Instance details

Defined in Amazonka.EC2.Types.EventInformation

Methods

rnf :: EventInformation -> () #

NFData EventType 
Instance details

Defined in Amazonka.EC2.Types.EventType

Methods

rnf :: EventType -> () #

NFData ExcessCapacityTerminationPolicy 
Instance details

Defined in Amazonka.EC2.Types.ExcessCapacityTerminationPolicy

NFData Explanation 
Instance details

Defined in Amazonka.EC2.Types.Explanation

Methods

rnf :: Explanation -> () #

NFData ExportEnvironment 
Instance details

Defined in Amazonka.EC2.Types.ExportEnvironment

Methods

rnf :: ExportEnvironment -> () #

NFData ExportImageTask 
Instance details

Defined in Amazonka.EC2.Types.ExportImageTask

Methods

rnf :: ExportImageTask -> () #

NFData ExportTask 
Instance details

Defined in Amazonka.EC2.Types.ExportTask

Methods

rnf :: ExportTask -> () #

NFData ExportTaskS3Location 
Instance details

Defined in Amazonka.EC2.Types.ExportTaskS3Location

Methods

rnf :: ExportTaskS3Location -> () #

NFData ExportTaskS3LocationRequest 
Instance details

Defined in Amazonka.EC2.Types.ExportTaskS3LocationRequest

NFData ExportTaskState 
Instance details

Defined in Amazonka.EC2.Types.ExportTaskState

Methods

rnf :: ExportTaskState -> () #

NFData ExportToS3Task 
Instance details

Defined in Amazonka.EC2.Types.ExportToS3Task

Methods

rnf :: ExportToS3Task -> () #

NFData ExportToS3TaskSpecification 
Instance details

Defined in Amazonka.EC2.Types.ExportToS3TaskSpecification

NFData FailedCapacityReservationFleetCancellationResult 
Instance details

Defined in Amazonka.EC2.Types.FailedCapacityReservationFleetCancellationResult

NFData FailedQueuedPurchaseDeletion 
Instance details

Defined in Amazonka.EC2.Types.FailedQueuedPurchaseDeletion

NFData FastLaunchLaunchTemplateSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.FastLaunchLaunchTemplateSpecificationRequest

NFData FastLaunchLaunchTemplateSpecificationResponse 
Instance details

Defined in Amazonka.EC2.Types.FastLaunchLaunchTemplateSpecificationResponse

NFData FastLaunchResourceType 
Instance details

Defined in Amazonka.EC2.Types.FastLaunchResourceType

Methods

rnf :: FastLaunchResourceType -> () #

NFData FastLaunchSnapshotConfigurationRequest 
Instance details

Defined in Amazonka.EC2.Types.FastLaunchSnapshotConfigurationRequest

NFData FastLaunchSnapshotConfigurationResponse 
Instance details

Defined in Amazonka.EC2.Types.FastLaunchSnapshotConfigurationResponse

NFData FastLaunchStateCode 
Instance details

Defined in Amazonka.EC2.Types.FastLaunchStateCode

Methods

rnf :: FastLaunchStateCode -> () #

NFData FastSnapshotRestoreStateCode 
Instance details

Defined in Amazonka.EC2.Types.FastSnapshotRestoreStateCode

NFData FederatedAuthentication 
Instance details

Defined in Amazonka.EC2.Types.FederatedAuthentication

Methods

rnf :: FederatedAuthentication -> () #

NFData FederatedAuthenticationRequest 
Instance details

Defined in Amazonka.EC2.Types.FederatedAuthenticationRequest

NFData Filter 
Instance details

Defined in Amazonka.EC2.Types.Filter

Methods

rnf :: Filter -> () #

NFData FindingsFound 
Instance details

Defined in Amazonka.EC2.Types.FindingsFound

Methods

rnf :: FindingsFound -> () #

NFData FleetActivityStatus 
Instance details

Defined in Amazonka.EC2.Types.FleetActivityStatus

Methods

rnf :: FleetActivityStatus -> () #

NFData FleetCapacityReservation 
Instance details

Defined in Amazonka.EC2.Types.FleetCapacityReservation

NFData FleetCapacityReservationTenancy 
Instance details

Defined in Amazonka.EC2.Types.FleetCapacityReservationTenancy

NFData FleetCapacityReservationUsageStrategy 
Instance details

Defined in Amazonka.EC2.Types.FleetCapacityReservationUsageStrategy

NFData FleetData 
Instance details

Defined in Amazonka.EC2.Types.FleetData

Methods

rnf :: FleetData -> () #

NFData FleetEventType 
Instance details

Defined in Amazonka.EC2.Types.FleetEventType

Methods

rnf :: FleetEventType -> () #

NFData FleetExcessCapacityTerminationPolicy 
Instance details

Defined in Amazonka.EC2.Types.FleetExcessCapacityTerminationPolicy

NFData FleetInstanceMatchCriteria 
Instance details

Defined in Amazonka.EC2.Types.FleetInstanceMatchCriteria

NFData FleetLaunchTemplateConfig 
Instance details

Defined in Amazonka.EC2.Types.FleetLaunchTemplateConfig

NFData FleetLaunchTemplateConfigRequest 
Instance details

Defined in Amazonka.EC2.Types.FleetLaunchTemplateConfigRequest

NFData FleetLaunchTemplateOverrides 
Instance details

Defined in Amazonka.EC2.Types.FleetLaunchTemplateOverrides

NFData FleetLaunchTemplateOverridesRequest 
Instance details

Defined in Amazonka.EC2.Types.FleetLaunchTemplateOverridesRequest

NFData FleetLaunchTemplateSpecification 
Instance details

Defined in Amazonka.EC2.Types.FleetLaunchTemplateSpecification

NFData FleetLaunchTemplateSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.FleetLaunchTemplateSpecificationRequest

NFData FleetOnDemandAllocationStrategy 
Instance details

Defined in Amazonka.EC2.Types.FleetOnDemandAllocationStrategy

NFData FleetReplacementStrategy 
Instance details

Defined in Amazonka.EC2.Types.FleetReplacementStrategy

NFData FleetSpotCapacityRebalance 
Instance details

Defined in Amazonka.EC2.Types.FleetSpotCapacityRebalance

NFData FleetSpotCapacityRebalanceRequest 
Instance details

Defined in Amazonka.EC2.Types.FleetSpotCapacityRebalanceRequest

NFData FleetSpotMaintenanceStrategies 
Instance details

Defined in Amazonka.EC2.Types.FleetSpotMaintenanceStrategies

NFData FleetSpotMaintenanceStrategiesRequest 
Instance details

Defined in Amazonka.EC2.Types.FleetSpotMaintenanceStrategiesRequest

NFData FleetStateCode 
Instance details

Defined in Amazonka.EC2.Types.FleetStateCode

Methods

rnf :: FleetStateCode -> () #

NFData FleetType 
Instance details

Defined in Amazonka.EC2.Types.FleetType

Methods

rnf :: FleetType -> () #

NFData FlowLog 
Instance details

Defined in Amazonka.EC2.Types.FlowLog

Methods

rnf :: FlowLog -> () #

NFData FlowLogsResourceType 
Instance details

Defined in Amazonka.EC2.Types.FlowLogsResourceType

Methods

rnf :: FlowLogsResourceType -> () #

NFData FpgaDeviceInfo 
Instance details

Defined in Amazonka.EC2.Types.FpgaDeviceInfo

Methods

rnf :: FpgaDeviceInfo -> () #

NFData FpgaDeviceMemoryInfo 
Instance details

Defined in Amazonka.EC2.Types.FpgaDeviceMemoryInfo

Methods

rnf :: FpgaDeviceMemoryInfo -> () #

NFData FpgaImage 
Instance details

Defined in Amazonka.EC2.Types.FpgaImage

Methods

rnf :: FpgaImage -> () #

NFData FpgaImageAttribute 
Instance details

Defined in Amazonka.EC2.Types.FpgaImageAttribute

Methods

rnf :: FpgaImageAttribute -> () #

NFData FpgaImageAttributeName 
Instance details

Defined in Amazonka.EC2.Types.FpgaImageAttributeName

Methods

rnf :: FpgaImageAttributeName -> () #

NFData FpgaImageState 
Instance details

Defined in Amazonka.EC2.Types.FpgaImageState

Methods

rnf :: FpgaImageState -> () #

NFData FpgaImageStateCode 
Instance details

Defined in Amazonka.EC2.Types.FpgaImageStateCode

Methods

rnf :: FpgaImageStateCode -> () #

NFData FpgaInfo 
Instance details

Defined in Amazonka.EC2.Types.FpgaInfo

Methods

rnf :: FpgaInfo -> () #

NFData GatewayAssociationState 
Instance details

Defined in Amazonka.EC2.Types.GatewayAssociationState

Methods

rnf :: GatewayAssociationState -> () #

NFData GatewayType 
Instance details

Defined in Amazonka.EC2.Types.GatewayType

Methods

rnf :: GatewayType -> () #

NFData GpuDeviceInfo 
Instance details

Defined in Amazonka.EC2.Types.GpuDeviceInfo

Methods

rnf :: GpuDeviceInfo -> () #

NFData GpuDeviceMemoryInfo 
Instance details

Defined in Amazonka.EC2.Types.GpuDeviceMemoryInfo

Methods

rnf :: GpuDeviceMemoryInfo -> () #

NFData GpuInfo 
Instance details

Defined in Amazonka.EC2.Types.GpuInfo

Methods

rnf :: GpuInfo -> () #

NFData GroupIdentifier 
Instance details

Defined in Amazonka.EC2.Types.GroupIdentifier

Methods

rnf :: GroupIdentifier -> () #

NFData HibernationOptions 
Instance details

Defined in Amazonka.EC2.Types.HibernationOptions

Methods

rnf :: HibernationOptions -> () #

NFData HibernationOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.HibernationOptionsRequest

NFData HistoryRecord 
Instance details

Defined in Amazonka.EC2.Types.HistoryRecord

Methods

rnf :: HistoryRecord -> () #

NFData HistoryRecordEntry 
Instance details

Defined in Amazonka.EC2.Types.HistoryRecordEntry

Methods

rnf :: HistoryRecordEntry -> () #

NFData Host 
Instance details

Defined in Amazonka.EC2.Types.Host

Methods

rnf :: Host -> () #

NFData HostInstance 
Instance details

Defined in Amazonka.EC2.Types.HostInstance

Methods

rnf :: HostInstance -> () #

NFData HostOffering 
Instance details

Defined in Amazonka.EC2.Types.HostOffering

Methods

rnf :: HostOffering -> () #

NFData HostProperties 
Instance details

Defined in Amazonka.EC2.Types.HostProperties

Methods

rnf :: HostProperties -> () #

NFData HostRecovery 
Instance details

Defined in Amazonka.EC2.Types.HostRecovery

Methods

rnf :: HostRecovery -> () #

NFData HostReservation 
Instance details

Defined in Amazonka.EC2.Types.HostReservation

Methods

rnf :: HostReservation -> () #

NFData HostTenancy 
Instance details

Defined in Amazonka.EC2.Types.HostTenancy

Methods

rnf :: HostTenancy -> () #

NFData HostnameType 
Instance details

Defined in Amazonka.EC2.Types.HostnameType

Methods

rnf :: HostnameType -> () #

NFData HttpTokensState 
Instance details

Defined in Amazonka.EC2.Types.HttpTokensState

Methods

rnf :: HttpTokensState -> () #

NFData HypervisorType 
Instance details

Defined in Amazonka.EC2.Types.HypervisorType

Methods

rnf :: HypervisorType -> () #

NFData IKEVersionsListValue 
Instance details

Defined in Amazonka.EC2.Types.IKEVersionsListValue

Methods

rnf :: IKEVersionsListValue -> () #

NFData IKEVersionsRequestListValue 
Instance details

Defined in Amazonka.EC2.Types.IKEVersionsRequestListValue

NFData IamInstanceProfile 
Instance details

Defined in Amazonka.EC2.Types.IamInstanceProfile

Methods

rnf :: IamInstanceProfile -> () #

NFData IamInstanceProfileAssociation 
Instance details

Defined in Amazonka.EC2.Types.IamInstanceProfileAssociation

NFData IamInstanceProfileAssociationState 
Instance details

Defined in Amazonka.EC2.Types.IamInstanceProfileAssociationState

NFData IamInstanceProfileSpecification 
Instance details

Defined in Amazonka.EC2.Types.IamInstanceProfileSpecification

NFData IcmpTypeCode 
Instance details

Defined in Amazonka.EC2.Types.IcmpTypeCode

Methods

rnf :: IcmpTypeCode -> () #

NFData IdFormat 
Instance details

Defined in Amazonka.EC2.Types.IdFormat

Methods

rnf :: IdFormat -> () #

NFData Igmpv2SupportValue 
Instance details

Defined in Amazonka.EC2.Types.Igmpv2SupportValue

Methods

rnf :: Igmpv2SupportValue -> () #

NFData Image 
Instance details

Defined in Amazonka.EC2.Types.Image

Methods

rnf :: Image -> () #

NFData ImageAttributeName 
Instance details

Defined in Amazonka.EC2.Types.ImageAttributeName

Methods

rnf :: ImageAttributeName -> () #

NFData ImageDiskContainer 
Instance details

Defined in Amazonka.EC2.Types.ImageDiskContainer

Methods

rnf :: ImageDiskContainer -> () #

NFData ImageRecycleBinInfo 
Instance details

Defined in Amazonka.EC2.Types.ImageRecycleBinInfo

Methods

rnf :: ImageRecycleBinInfo -> () #

NFData ImageState 
Instance details

Defined in Amazonka.EC2.Types.ImageState

Methods

rnf :: ImageState -> () #

NFData ImageTypeValues 
Instance details

Defined in Amazonka.EC2.Types.ImageTypeValues

Methods

rnf :: ImageTypeValues -> () #

NFData ImdsSupportValues 
Instance details

Defined in Amazonka.EC2.Types.ImdsSupportValues

Methods

rnf :: ImdsSupportValues -> () #

NFData ImportImageLicenseConfigurationRequest 
Instance details

Defined in Amazonka.EC2.Types.ImportImageLicenseConfigurationRequest

NFData ImportImageLicenseConfigurationResponse 
Instance details

Defined in Amazonka.EC2.Types.ImportImageLicenseConfigurationResponse

NFData ImportImageTask 
Instance details

Defined in Amazonka.EC2.Types.ImportImageTask

Methods

rnf :: ImportImageTask -> () #

NFData ImportInstanceLaunchSpecification 
Instance details

Defined in Amazonka.EC2.Types.ImportInstanceLaunchSpecification

NFData ImportInstanceTaskDetails 
Instance details

Defined in Amazonka.EC2.Types.ImportInstanceTaskDetails

NFData ImportInstanceVolumeDetailItem 
Instance details

Defined in Amazonka.EC2.Types.ImportInstanceVolumeDetailItem

NFData ImportSnapshotTask 
Instance details

Defined in Amazonka.EC2.Types.ImportSnapshotTask

Methods

rnf :: ImportSnapshotTask -> () #

NFData ImportVolumeTaskDetails 
Instance details

Defined in Amazonka.EC2.Types.ImportVolumeTaskDetails

Methods

rnf :: ImportVolumeTaskDetails -> () #

NFData InferenceAcceleratorInfo 
Instance details

Defined in Amazonka.EC2.Types.InferenceAcceleratorInfo

NFData InferenceDeviceInfo 
Instance details

Defined in Amazonka.EC2.Types.InferenceDeviceInfo

Methods

rnf :: InferenceDeviceInfo -> () #

NFData Instance 
Instance details

Defined in Amazonka.EC2.Types.Instance

Methods

rnf :: Instance -> () #

NFData InstanceAttributeName 
Instance details

Defined in Amazonka.EC2.Types.InstanceAttributeName

Methods

rnf :: InstanceAttributeName -> () #

NFData InstanceAutoRecoveryState 
Instance details

Defined in Amazonka.EC2.Types.InstanceAutoRecoveryState

NFData InstanceBlockDeviceMapping 
Instance details

Defined in Amazonka.EC2.Types.InstanceBlockDeviceMapping

NFData InstanceBlockDeviceMappingSpecification 
Instance details

Defined in Amazonka.EC2.Types.InstanceBlockDeviceMappingSpecification

NFData InstanceCapacity 
Instance details

Defined in Amazonka.EC2.Types.InstanceCapacity

Methods

rnf :: InstanceCapacity -> () #

NFData InstanceCount 
Instance details

Defined in Amazonka.EC2.Types.InstanceCount

Methods

rnf :: InstanceCount -> () #

NFData InstanceCreditSpecification 
Instance details

Defined in Amazonka.EC2.Types.InstanceCreditSpecification

NFData InstanceCreditSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceCreditSpecificationRequest

NFData InstanceEventWindow 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindow

Methods

rnf :: InstanceEventWindow -> () #

NFData InstanceEventWindowAssociationRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindowAssociationRequest

NFData InstanceEventWindowAssociationTarget 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindowAssociationTarget

NFData InstanceEventWindowDisassociationRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindowDisassociationRequest

NFData InstanceEventWindowState 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindowState

NFData InstanceEventWindowStateChange 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindowStateChange

NFData InstanceEventWindowTimeRange 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindowTimeRange

NFData InstanceEventWindowTimeRangeRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceEventWindowTimeRangeRequest

NFData InstanceExportDetails 
Instance details

Defined in Amazonka.EC2.Types.InstanceExportDetails

Methods

rnf :: InstanceExportDetails -> () #

NFData InstanceFamilyCreditSpecification 
Instance details

Defined in Amazonka.EC2.Types.InstanceFamilyCreditSpecification

NFData InstanceGeneration 
Instance details

Defined in Amazonka.EC2.Types.InstanceGeneration

Methods

rnf :: InstanceGeneration -> () #

NFData InstanceHealthStatus 
Instance details

Defined in Amazonka.EC2.Types.InstanceHealthStatus

Methods

rnf :: InstanceHealthStatus -> () #

NFData InstanceInterruptionBehavior 
Instance details

Defined in Amazonka.EC2.Types.InstanceInterruptionBehavior

NFData InstanceIpv4Prefix 
Instance details

Defined in Amazonka.EC2.Types.InstanceIpv4Prefix

Methods

rnf :: InstanceIpv4Prefix -> () #

NFData InstanceIpv6Address 
Instance details

Defined in Amazonka.EC2.Types.InstanceIpv6Address

Methods

rnf :: InstanceIpv6Address -> () #

NFData InstanceIpv6AddressRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceIpv6AddressRequest

NFData InstanceIpv6Prefix 
Instance details

Defined in Amazonka.EC2.Types.InstanceIpv6Prefix

Methods

rnf :: InstanceIpv6Prefix -> () #

NFData InstanceLifecycle 
Instance details

Defined in Amazonka.EC2.Types.InstanceLifecycle

Methods

rnf :: InstanceLifecycle -> () #

NFData InstanceLifecycleType 
Instance details

Defined in Amazonka.EC2.Types.InstanceLifecycleType

Methods

rnf :: InstanceLifecycleType -> () #

NFData InstanceMaintenanceOptions 
Instance details

Defined in Amazonka.EC2.Types.InstanceMaintenanceOptions

NFData InstanceMaintenanceOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceMaintenanceOptionsRequest

NFData InstanceMarketOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceMarketOptionsRequest

NFData InstanceMatchCriteria 
Instance details

Defined in Amazonka.EC2.Types.InstanceMatchCriteria

Methods

rnf :: InstanceMatchCriteria -> () #

NFData InstanceMetadataEndpointState 
Instance details

Defined in Amazonka.EC2.Types.InstanceMetadataEndpointState

NFData InstanceMetadataOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceMetadataOptionsRequest

NFData InstanceMetadataOptionsResponse 
Instance details

Defined in Amazonka.EC2.Types.InstanceMetadataOptionsResponse

NFData InstanceMetadataOptionsState 
Instance details

Defined in Amazonka.EC2.Types.InstanceMetadataOptionsState

NFData InstanceMetadataProtocolState 
Instance details

Defined in Amazonka.EC2.Types.InstanceMetadataProtocolState

NFData InstanceMetadataTagsState 
Instance details

Defined in Amazonka.EC2.Types.InstanceMetadataTagsState

NFData InstanceMonitoring 
Instance details

Defined in Amazonka.EC2.Types.InstanceMonitoring

Methods

rnf :: InstanceMonitoring -> () #

NFData InstanceNetworkInterface 
Instance details

Defined in Amazonka.EC2.Types.InstanceNetworkInterface

NFData InstanceNetworkInterfaceAssociation 
Instance details

Defined in Amazonka.EC2.Types.InstanceNetworkInterfaceAssociation

NFData InstanceNetworkInterfaceAttachment 
Instance details

Defined in Amazonka.EC2.Types.InstanceNetworkInterfaceAttachment

NFData InstanceNetworkInterfaceSpecification 
Instance details

Defined in Amazonka.EC2.Types.InstanceNetworkInterfaceSpecification

NFData InstancePrivateIpAddress 
Instance details

Defined in Amazonka.EC2.Types.InstancePrivateIpAddress

NFData InstanceRequirements 
Instance details

Defined in Amazonka.EC2.Types.InstanceRequirements

Methods

rnf :: InstanceRequirements -> () #

NFData InstanceRequirementsRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceRequirementsRequest

NFData InstanceRequirementsWithMetadataRequest 
Instance details

Defined in Amazonka.EC2.Types.InstanceRequirementsWithMetadataRequest

NFData InstanceSpecification 
Instance details

Defined in Amazonka.EC2.Types.InstanceSpecification

Methods

rnf :: InstanceSpecification -> () #

NFData InstanceState 
Instance details

Defined in Amazonka.EC2.Types.InstanceState

Methods

rnf :: InstanceState -> () #

NFData InstanceStateChange 
Instance details

Defined in Amazonka.EC2.Types.InstanceStateChange

Methods

rnf :: InstanceStateChange -> () #

NFData InstanceStateName 
Instance details

Defined in Amazonka.EC2.Types.InstanceStateName

Methods

rnf :: InstanceStateName -> () #

NFData InstanceStatus 
Instance details

Defined in Amazonka.EC2.Types.InstanceStatus

Methods

rnf :: InstanceStatus -> () #

NFData InstanceStatusDetails 
Instance details

Defined in Amazonka.EC2.Types.InstanceStatusDetails

Methods

rnf :: InstanceStatusDetails -> () #

NFData InstanceStatusEvent 
Instance details

Defined in Amazonka.EC2.Types.InstanceStatusEvent

Methods

rnf :: InstanceStatusEvent -> () #

NFData InstanceStatusSummary 
Instance details

Defined in Amazonka.EC2.Types.InstanceStatusSummary

Methods

rnf :: InstanceStatusSummary -> () #

NFData InstanceStorageEncryptionSupport 
Instance details

Defined in Amazonka.EC2.Types.InstanceStorageEncryptionSupport

NFData InstanceStorageInfo 
Instance details

Defined in Amazonka.EC2.Types.InstanceStorageInfo

Methods

rnf :: InstanceStorageInfo -> () #

NFData InstanceTagNotificationAttribute 
Instance details

Defined in Amazonka.EC2.Types.InstanceTagNotificationAttribute

NFData InstanceType 
Instance details

Defined in Amazonka.EC2.Types.InstanceType

Methods

rnf :: InstanceType -> () #

NFData InstanceTypeHypervisor 
Instance details

Defined in Amazonka.EC2.Types.InstanceTypeHypervisor

Methods

rnf :: InstanceTypeHypervisor -> () #

NFData InstanceTypeInfo 
Instance details

Defined in Amazonka.EC2.Types.InstanceTypeInfo

Methods

rnf :: InstanceTypeInfo -> () #

NFData InstanceTypeInfoFromInstanceRequirements 
Instance details

Defined in Amazonka.EC2.Types.InstanceTypeInfoFromInstanceRequirements

NFData InstanceTypeOffering 
Instance details

Defined in Amazonka.EC2.Types.InstanceTypeOffering

Methods

rnf :: InstanceTypeOffering -> () #

NFData InstanceUsage 
Instance details

Defined in Amazonka.EC2.Types.InstanceUsage

Methods

rnf :: InstanceUsage -> () #

NFData IntegrateServices 
Instance details

Defined in Amazonka.EC2.Types.IntegrateServices

Methods

rnf :: IntegrateServices -> () #

NFData InterfacePermissionType 
Instance details

Defined in Amazonka.EC2.Types.InterfacePermissionType

Methods

rnf :: InterfacePermissionType -> () #

NFData InterfaceProtocolType 
Instance details

Defined in Amazonka.EC2.Types.InterfaceProtocolType

Methods

rnf :: InterfaceProtocolType -> () #

NFData InternetGateway 
Instance details

Defined in Amazonka.EC2.Types.InternetGateway

Methods

rnf :: InternetGateway -> () #

NFData InternetGatewayAttachment 
Instance details

Defined in Amazonka.EC2.Types.InternetGatewayAttachment

NFData IpAddressType 
Instance details

Defined in Amazonka.EC2.Types.IpAddressType

Methods

rnf :: IpAddressType -> () #

NFData IpPermission 
Instance details

Defined in Amazonka.EC2.Types.IpPermission

Methods

rnf :: IpPermission -> () #

NFData IpRange 
Instance details

Defined in Amazonka.EC2.Types.IpRange

Methods

rnf :: IpRange -> () #

NFData Ipam 
Instance details

Defined in Amazonka.EC2.Types.Ipam

Methods

rnf :: Ipam -> () #

NFData IpamAddressHistoryRecord 
Instance details

Defined in Amazonka.EC2.Types.IpamAddressHistoryRecord

NFData IpamAddressHistoryResourceType 
Instance details

Defined in Amazonka.EC2.Types.IpamAddressHistoryResourceType

NFData IpamCidrAuthorizationContext 
Instance details

Defined in Amazonka.EC2.Types.IpamCidrAuthorizationContext

NFData IpamComplianceStatus 
Instance details

Defined in Amazonka.EC2.Types.IpamComplianceStatus

Methods

rnf :: IpamComplianceStatus -> () #

NFData IpamManagementState 
Instance details

Defined in Amazonka.EC2.Types.IpamManagementState

Methods

rnf :: IpamManagementState -> () #

NFData IpamOperatingRegion 
Instance details

Defined in Amazonka.EC2.Types.IpamOperatingRegion

Methods

rnf :: IpamOperatingRegion -> () #

NFData IpamOverlapStatus 
Instance details

Defined in Amazonka.EC2.Types.IpamOverlapStatus

Methods

rnf :: IpamOverlapStatus -> () #

NFData IpamPool 
Instance details

Defined in Amazonka.EC2.Types.IpamPool

Methods

rnf :: IpamPool -> () #

NFData IpamPoolAllocation 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolAllocation

Methods

rnf :: IpamPoolAllocation -> () #

NFData IpamPoolAllocationResourceType 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolAllocationResourceType

NFData IpamPoolAwsService 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolAwsService

Methods

rnf :: IpamPoolAwsService -> () #

NFData IpamPoolCidr 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolCidr

Methods

rnf :: IpamPoolCidr -> () #

NFData IpamPoolCidrFailureCode 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolCidrFailureCode

Methods

rnf :: IpamPoolCidrFailureCode -> () #

NFData IpamPoolCidrFailureReason 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolCidrFailureReason

NFData IpamPoolCidrState 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolCidrState

Methods

rnf :: IpamPoolCidrState -> () #

NFData IpamPoolState 
Instance details

Defined in Amazonka.EC2.Types.IpamPoolState

Methods

rnf :: IpamPoolState -> () #

NFData IpamResourceCidr 
Instance details

Defined in Amazonka.EC2.Types.IpamResourceCidr

Methods

rnf :: IpamResourceCidr -> () #

NFData IpamResourceTag 
Instance details

Defined in Amazonka.EC2.Types.IpamResourceTag

Methods

rnf :: IpamResourceTag -> () #

NFData IpamResourceType 
Instance details

Defined in Amazonka.EC2.Types.IpamResourceType

Methods

rnf :: IpamResourceType -> () #

NFData IpamScope 
Instance details

Defined in Amazonka.EC2.Types.IpamScope

Methods

rnf :: IpamScope -> () #

NFData IpamScopeState 
Instance details

Defined in Amazonka.EC2.Types.IpamScopeState

Methods

rnf :: IpamScopeState -> () #

NFData IpamScopeType 
Instance details

Defined in Amazonka.EC2.Types.IpamScopeType

Methods

rnf :: IpamScopeType -> () #

NFData IpamState 
Instance details

Defined in Amazonka.EC2.Types.IpamState

Methods

rnf :: IpamState -> () #

NFData Ipv4PrefixSpecification 
Instance details

Defined in Amazonka.EC2.Types.Ipv4PrefixSpecification

Methods

rnf :: Ipv4PrefixSpecification -> () #

NFData Ipv4PrefixSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.Ipv4PrefixSpecificationRequest

NFData Ipv4PrefixSpecificationResponse 
Instance details

Defined in Amazonka.EC2.Types.Ipv4PrefixSpecificationResponse

NFData Ipv6CidrAssociation 
Instance details

Defined in Amazonka.EC2.Types.Ipv6CidrAssociation

Methods

rnf :: Ipv6CidrAssociation -> () #

NFData Ipv6CidrBlock 
Instance details

Defined in Amazonka.EC2.Types.Ipv6CidrBlock

Methods

rnf :: Ipv6CidrBlock -> () #

NFData Ipv6Pool 
Instance details

Defined in Amazonka.EC2.Types.Ipv6Pool

Methods

rnf :: Ipv6Pool -> () #

NFData Ipv6PrefixSpecification 
Instance details

Defined in Amazonka.EC2.Types.Ipv6PrefixSpecification

Methods

rnf :: Ipv6PrefixSpecification -> () #

NFData Ipv6PrefixSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.Ipv6PrefixSpecificationRequest

NFData Ipv6PrefixSpecificationResponse 
Instance details

Defined in Amazonka.EC2.Types.Ipv6PrefixSpecificationResponse

NFData Ipv6Range 
Instance details

Defined in Amazonka.EC2.Types.Ipv6Range

Methods

rnf :: Ipv6Range -> () #

NFData Ipv6SupportValue 
Instance details

Defined in Amazonka.EC2.Types.Ipv6SupportValue

Methods

rnf :: Ipv6SupportValue -> () #

NFData KeyFormat 
Instance details

Defined in Amazonka.EC2.Types.KeyFormat

Methods

rnf :: KeyFormat -> () #

NFData KeyPairInfo 
Instance details

Defined in Amazonka.EC2.Types.KeyPairInfo

Methods

rnf :: KeyPairInfo -> () #

NFData KeyType 
Instance details

Defined in Amazonka.EC2.Types.KeyType

Methods

rnf :: KeyType -> () #

NFData LastError 
Instance details

Defined in Amazonka.EC2.Types.LastError

Methods

rnf :: LastError -> () #

NFData LaunchPermission 
Instance details

Defined in Amazonka.EC2.Types.LaunchPermission

Methods

rnf :: LaunchPermission -> () #

NFData LaunchPermissionModifications 
Instance details

Defined in Amazonka.EC2.Types.LaunchPermissionModifications

NFData LaunchSpecification 
Instance details

Defined in Amazonka.EC2.Types.LaunchSpecification

Methods

rnf :: LaunchSpecification -> () #

NFData LaunchTemplate 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplate

Methods

rnf :: LaunchTemplate -> () #

NFData LaunchTemplateAndOverridesResponse 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateAndOverridesResponse

NFData LaunchTemplateAutoRecoveryState 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateAutoRecoveryState

NFData LaunchTemplateBlockDeviceMapping 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateBlockDeviceMapping

NFData LaunchTemplateBlockDeviceMappingRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateBlockDeviceMappingRequest

NFData LaunchTemplateCapacityReservationSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateCapacityReservationSpecificationRequest

NFData LaunchTemplateCapacityReservationSpecificationResponse 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateCapacityReservationSpecificationResponse

NFData LaunchTemplateConfig 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateConfig

Methods

rnf :: LaunchTemplateConfig -> () #

NFData LaunchTemplateCpuOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateCpuOptions

NFData LaunchTemplateCpuOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateCpuOptionsRequest

NFData LaunchTemplateEbsBlockDevice 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateEbsBlockDevice

NFData LaunchTemplateEbsBlockDeviceRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateEbsBlockDeviceRequest

NFData LaunchTemplateElasticInferenceAccelerator 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateElasticInferenceAccelerator

NFData LaunchTemplateElasticInferenceAcceleratorResponse 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateElasticInferenceAcceleratorResponse

NFData LaunchTemplateEnclaveOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateEnclaveOptions

NFData LaunchTemplateEnclaveOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateEnclaveOptionsRequest

NFData LaunchTemplateErrorCode 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateErrorCode

Methods

rnf :: LaunchTemplateErrorCode -> () #

NFData LaunchTemplateHibernationOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateHibernationOptions

NFData LaunchTemplateHibernationOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateHibernationOptionsRequest

NFData LaunchTemplateHttpTokensState 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateHttpTokensState

NFData LaunchTemplateIamInstanceProfileSpecification 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateIamInstanceProfileSpecification

NFData LaunchTemplateIamInstanceProfileSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateIamInstanceProfileSpecificationRequest

NFData LaunchTemplateInstanceMaintenanceOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMaintenanceOptions

NFData LaunchTemplateInstanceMaintenanceOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMaintenanceOptionsRequest

NFData LaunchTemplateInstanceMarketOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMarketOptions

NFData LaunchTemplateInstanceMarketOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMarketOptionsRequest

NFData LaunchTemplateInstanceMetadataEndpointState 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMetadataEndpointState

NFData LaunchTemplateInstanceMetadataOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMetadataOptions

NFData LaunchTemplateInstanceMetadataOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMetadataOptionsRequest

NFData LaunchTemplateInstanceMetadataOptionsState 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMetadataOptionsState

NFData LaunchTemplateInstanceMetadataProtocolIpv6 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMetadataProtocolIpv6

NFData LaunchTemplateInstanceMetadataTagsState 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceMetadataTagsState

NFData LaunchTemplateInstanceNetworkInterfaceSpecification 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceNetworkInterfaceSpecification

NFData LaunchTemplateInstanceNetworkInterfaceSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateInstanceNetworkInterfaceSpecificationRequest

NFData LaunchTemplateLicenseConfiguration 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateLicenseConfiguration

NFData LaunchTemplateLicenseConfigurationRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateLicenseConfigurationRequest

NFData LaunchTemplateOverrides 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateOverrides

Methods

rnf :: LaunchTemplateOverrides -> () #

NFData LaunchTemplatePlacement 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplatePlacement

Methods

rnf :: LaunchTemplatePlacement -> () #

NFData LaunchTemplatePlacementRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplatePlacementRequest

NFData LaunchTemplatePrivateDnsNameOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplatePrivateDnsNameOptions

NFData LaunchTemplatePrivateDnsNameOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplatePrivateDnsNameOptionsRequest

NFData LaunchTemplateSpecification 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateSpecification

NFData LaunchTemplateSpotMarketOptions 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateSpotMarketOptions

NFData LaunchTemplateSpotMarketOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateSpotMarketOptionsRequest

NFData LaunchTemplateTagSpecification 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateTagSpecification

NFData LaunchTemplateTagSpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateTagSpecificationRequest

NFData LaunchTemplateVersion 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplateVersion

Methods

rnf :: LaunchTemplateVersion -> () #

NFData LaunchTemplatesMonitoring 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplatesMonitoring

NFData LaunchTemplatesMonitoringRequest 
Instance details

Defined in Amazonka.EC2.Types.LaunchTemplatesMonitoringRequest

NFData LicenseConfiguration 
Instance details

Defined in Amazonka.EC2.Types.LicenseConfiguration

Methods

rnf :: LicenseConfiguration -> () #

NFData LicenseConfigurationRequest 
Instance details

Defined in Amazonka.EC2.Types.LicenseConfigurationRequest

NFData ListingState 
Instance details

Defined in Amazonka.EC2.Types.ListingState

Methods

rnf :: ListingState -> () #

NFData ListingStatus 
Instance details

Defined in Amazonka.EC2.Types.ListingStatus

Methods

rnf :: ListingStatus -> () #

NFData LoadBalancersConfig 
Instance details

Defined in Amazonka.EC2.Types.LoadBalancersConfig

Methods

rnf :: LoadBalancersConfig -> () #

NFData LoadPermission 
Instance details

Defined in Amazonka.EC2.Types.LoadPermission

Methods

rnf :: LoadPermission -> () #

NFData LoadPermissionModifications 
Instance details

Defined in Amazonka.EC2.Types.LoadPermissionModifications

NFData LoadPermissionRequest 
Instance details

Defined in Amazonka.EC2.Types.LoadPermissionRequest

Methods

rnf :: LoadPermissionRequest -> () #

NFData LocalGateway 
Instance details

Defined in Amazonka.EC2.Types.LocalGateway

Methods

rnf :: LocalGateway -> () #

NFData LocalGatewayRoute 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRoute

Methods

rnf :: LocalGatewayRoute -> () #

NFData LocalGatewayRouteState 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRouteState

Methods

rnf :: LocalGatewayRouteState -> () #

NFData LocalGatewayRouteTable 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRouteTable

Methods

rnf :: LocalGatewayRouteTable -> () #

NFData LocalGatewayRouteTableMode 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRouteTableMode

NFData LocalGatewayRouteTableVirtualInterfaceGroupAssociation 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRouteTableVirtualInterfaceGroupAssociation

NFData LocalGatewayRouteTableVpcAssociation 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRouteTableVpcAssociation

NFData LocalGatewayRouteType 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayRouteType

Methods

rnf :: LocalGatewayRouteType -> () #

NFData LocalGatewayVirtualInterface 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayVirtualInterface

NFData LocalGatewayVirtualInterfaceGroup 
Instance details

Defined in Amazonka.EC2.Types.LocalGatewayVirtualInterfaceGroup

NFData LocalStorage 
Instance details

Defined in Amazonka.EC2.Types.LocalStorage

Methods

rnf :: LocalStorage -> () #

NFData LocalStorageType 
Instance details

Defined in Amazonka.EC2.Types.LocalStorageType

Methods

rnf :: LocalStorageType -> () #

NFData LocationType 
Instance details

Defined in Amazonka.EC2.Types.LocationType

Methods

rnf :: LocationType -> () #

NFData LogDestinationType 
Instance details

Defined in Amazonka.EC2.Types.LogDestinationType

Methods

rnf :: LogDestinationType -> () #

NFData ManagedPrefixList 
Instance details

Defined in Amazonka.EC2.Types.ManagedPrefixList

Methods

rnf :: ManagedPrefixList -> () #

NFData MarketType 
Instance details

Defined in Amazonka.EC2.Types.MarketType

Methods

rnf :: MarketType -> () #

NFData MembershipType 
Instance details

Defined in Amazonka.EC2.Types.MembershipType

Methods

rnf :: MembershipType -> () #

NFData MemoryGiBPerVCpu 
Instance details

Defined in Amazonka.EC2.Types.MemoryGiBPerVCpu

Methods

rnf :: MemoryGiBPerVCpu -> () #

NFData MemoryGiBPerVCpuRequest 
Instance details

Defined in Amazonka.EC2.Types.MemoryGiBPerVCpuRequest

Methods

rnf :: MemoryGiBPerVCpuRequest -> () #

NFData MemoryInfo 
Instance details

Defined in Amazonka.EC2.Types.MemoryInfo

Methods

rnf :: MemoryInfo -> () #

NFData MemoryMiB 
Instance details

Defined in Amazonka.EC2.Types.MemoryMiB

Methods

rnf :: MemoryMiB -> () #

NFData MemoryMiBRequest 
Instance details

Defined in Amazonka.EC2.Types.MemoryMiBRequest

Methods

rnf :: MemoryMiBRequest -> () #

NFData MetricPoint 
Instance details

Defined in Amazonka.EC2.Types.MetricPoint

Methods

rnf :: MetricPoint -> () #

NFData MetricType 
Instance details

Defined in Amazonka.EC2.Types.MetricType

Methods

rnf :: MetricType -> () #

NFData ModifyAvailabilityZoneOptInStatus 
Instance details

Defined in Amazonka.EC2.Types.ModifyAvailabilityZoneOptInStatus

NFData ModifyTransitGatewayOptions 
Instance details

Defined in Amazonka.EC2.Types.ModifyTransitGatewayOptions

NFData ModifyTransitGatewayVpcAttachmentRequestOptions 
Instance details

Defined in Amazonka.EC2.Types.ModifyTransitGatewayVpcAttachmentRequestOptions

NFData ModifyVerifiedAccessEndpointEniOptions 
Instance details

Defined in Amazonka.EC2.Types.ModifyVerifiedAccessEndpointEniOptions

NFData ModifyVerifiedAccessEndpointLoadBalancerOptions 
Instance details

Defined in Amazonka.EC2.Types.ModifyVerifiedAccessEndpointLoadBalancerOptions

NFData ModifyVerifiedAccessTrustProviderOidcOptions 
Instance details

Defined in Amazonka.EC2.Types.ModifyVerifiedAccessTrustProviderOidcOptions

NFData ModifyVpnTunnelOptionsSpecification 
Instance details

Defined in Amazonka.EC2.Types.ModifyVpnTunnelOptionsSpecification

NFData Monitoring 
Instance details

Defined in Amazonka.EC2.Types.Monitoring

Methods

rnf :: Monitoring -> () #

NFData MonitoringState 
Instance details

Defined in Amazonka.EC2.Types.MonitoringState

Methods

rnf :: MonitoringState -> () #

NFData MoveStatus 
Instance details

Defined in Amazonka.EC2.Types.MoveStatus

Methods

rnf :: MoveStatus -> () #

NFData MovingAddressStatus 
Instance details

Defined in Amazonka.EC2.Types.MovingAddressStatus

Methods

rnf :: MovingAddressStatus -> () #

NFData MulticastSupportValue 
Instance details

Defined in Amazonka.EC2.Types.MulticastSupportValue

Methods

rnf :: MulticastSupportValue -> () #

NFData NatGateway 
Instance details

Defined in Amazonka.EC2.Types.NatGateway

Methods

rnf :: NatGateway -> () #

NFData NatGatewayAddress 
Instance details

Defined in Amazonka.EC2.Types.NatGatewayAddress

Methods

rnf :: NatGatewayAddress -> () #

NFData NatGatewayState 
Instance details

Defined in Amazonka.EC2.Types.NatGatewayState

Methods

rnf :: NatGatewayState -> () #

NFData NetworkAcl 
Instance details

Defined in Amazonka.EC2.Types.NetworkAcl

Methods

rnf :: NetworkAcl -> () #

NFData NetworkAclAssociation 
Instance details

Defined in Amazonka.EC2.Types.NetworkAclAssociation

Methods

rnf :: NetworkAclAssociation -> () #

NFData NetworkAclEntry 
Instance details

Defined in Amazonka.EC2.Types.NetworkAclEntry

Methods

rnf :: NetworkAclEntry -> () #

NFData NetworkBandwidthGbps 
Instance details

Defined in Amazonka.EC2.Types.NetworkBandwidthGbps

Methods

rnf :: NetworkBandwidthGbps -> () #

NFData NetworkBandwidthGbpsRequest 
Instance details

Defined in Amazonka.EC2.Types.NetworkBandwidthGbpsRequest

NFData NetworkCardInfo 
Instance details

Defined in Amazonka.EC2.Types.NetworkCardInfo

Methods

rnf :: NetworkCardInfo -> () #

NFData NetworkInfo 
Instance details

Defined in Amazonka.EC2.Types.NetworkInfo

Methods

rnf :: NetworkInfo -> () #

NFData NetworkInsightsAccessScope 
Instance details

Defined in Amazonka.EC2.Types.NetworkInsightsAccessScope

NFData NetworkInsightsAccessScopeAnalysis 
Instance details

Defined in Amazonka.EC2.Types.NetworkInsightsAccessScopeAnalysis

NFData NetworkInsightsAccessScopeContent 
Instance details

Defined in Amazonka.EC2.Types.NetworkInsightsAccessScopeContent

NFData NetworkInsightsAnalysis 
Instance details

Defined in Amazonka.EC2.Types.NetworkInsightsAnalysis

Methods

rnf :: NetworkInsightsAnalysis -> () #

NFData NetworkInsightsPath 
Instance details

Defined in Amazonka.EC2.Types.NetworkInsightsPath

Methods

rnf :: NetworkInsightsPath -> () #

NFData NetworkInterface 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterface

Methods

rnf :: NetworkInterface -> () #

NFData NetworkInterfaceAssociation 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceAssociation

NFData NetworkInterfaceAttachment 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceAttachment

NFData NetworkInterfaceAttachmentChanges 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceAttachmentChanges

NFData NetworkInterfaceAttribute 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceAttribute

NFData NetworkInterfaceCount 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceCount

Methods

rnf :: NetworkInterfaceCount -> () #

NFData NetworkInterfaceCountRequest 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceCountRequest

NFData NetworkInterfaceCreationType 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceCreationType

NFData NetworkInterfaceIpv6Address 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceIpv6Address

NFData NetworkInterfacePermission 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfacePermission

NFData NetworkInterfacePermissionState 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfacePermissionState

NFData NetworkInterfacePermissionStateCode 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfacePermissionStateCode

NFData NetworkInterfacePrivateIpAddress 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfacePrivateIpAddress

NFData NetworkInterfaceStatus 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceStatus

Methods

rnf :: NetworkInterfaceStatus -> () #

NFData NetworkInterfaceType 
Instance details

Defined in Amazonka.EC2.Types.NetworkInterfaceType

Methods

rnf :: NetworkInterfaceType -> () #

NFData NewDhcpConfiguration 
Instance details

Defined in Amazonka.EC2.Types.NewDhcpConfiguration

Methods

rnf :: NewDhcpConfiguration -> () #

NFData OfferingClassType 
Instance details

Defined in Amazonka.EC2.Types.OfferingClassType

Methods

rnf :: OfferingClassType -> () #

NFData OfferingTypeValues 
Instance details

Defined in Amazonka.EC2.Types.OfferingTypeValues

Methods

rnf :: OfferingTypeValues -> () #

NFData OidcOptions 
Instance details

Defined in Amazonka.EC2.Types.OidcOptions

Methods

rnf :: OidcOptions -> () #

NFData OnDemandAllocationStrategy 
Instance details

Defined in Amazonka.EC2.Types.OnDemandAllocationStrategy

NFData OnDemandOptions 
Instance details

Defined in Amazonka.EC2.Types.OnDemandOptions

Methods

rnf :: OnDemandOptions -> () #

NFData OnDemandOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.OnDemandOptionsRequest

Methods

rnf :: OnDemandOptionsRequest -> () #

NFData OperationType 
Instance details

Defined in Amazonka.EC2.Types.OperationType

Methods

rnf :: OperationType -> () #

NFData PacketHeaderStatement 
Instance details

Defined in Amazonka.EC2.Types.PacketHeaderStatement

Methods

rnf :: PacketHeaderStatement -> () #

NFData PacketHeaderStatementRequest 
Instance details

Defined in Amazonka.EC2.Types.PacketHeaderStatementRequest

NFData PartitionLoadFrequency 
Instance details

Defined in Amazonka.EC2.Types.PartitionLoadFrequency

Methods

rnf :: PartitionLoadFrequency -> () #

NFData PathComponent 
Instance details

Defined in Amazonka.EC2.Types.PathComponent

Methods

rnf :: PathComponent -> () #

NFData PathStatement 
Instance details

Defined in Amazonka.EC2.Types.PathStatement

Methods

rnf :: PathStatement -> () #

NFData PathStatementRequest 
Instance details

Defined in Amazonka.EC2.Types.PathStatementRequest

Methods

rnf :: PathStatementRequest -> () #

NFData PayerResponsibility 
Instance details

Defined in Amazonka.EC2.Types.PayerResponsibility

Methods

rnf :: PayerResponsibility -> () #

NFData PaymentOption 
Instance details

Defined in Amazonka.EC2.Types.PaymentOption

Methods

rnf :: PaymentOption -> () #

NFData PciId 
Instance details

Defined in Amazonka.EC2.Types.PciId

Methods

rnf :: PciId -> () #

NFData PeeringAttachmentStatus 
Instance details

Defined in Amazonka.EC2.Types.PeeringAttachmentStatus

Methods

rnf :: PeeringAttachmentStatus -> () #

NFData PeeringConnectionOptions 
Instance details

Defined in Amazonka.EC2.Types.PeeringConnectionOptions

NFData PeeringConnectionOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.PeeringConnectionOptionsRequest

NFData PeeringTgwInfo 
Instance details

Defined in Amazonka.EC2.Types.PeeringTgwInfo

Methods

rnf :: PeeringTgwInfo -> () #

NFData PeriodType 
Instance details

Defined in Amazonka.EC2.Types.PeriodType

Methods

rnf :: PeriodType -> () #

NFData PermissionGroup 
Instance details

Defined in Amazonka.EC2.Types.PermissionGroup

Methods

rnf :: PermissionGroup -> () #

NFData Phase1DHGroupNumbersListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase1DHGroupNumbersListValue

NFData Phase1DHGroupNumbersRequestListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase1DHGroupNumbersRequestListValue

NFData Phase1EncryptionAlgorithmsListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase1EncryptionAlgorithmsListValue

NFData Phase1EncryptionAlgorithmsRequestListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase1EncryptionAlgorithmsRequestListValue

NFData Phase1IntegrityAlgorithmsListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase1IntegrityAlgorithmsListValue

NFData Phase1IntegrityAlgorithmsRequestListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase1IntegrityAlgorithmsRequestListValue

NFData Phase2DHGroupNumbersListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase2DHGroupNumbersListValue

NFData Phase2DHGroupNumbersRequestListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase2DHGroupNumbersRequestListValue

NFData Phase2EncryptionAlgorithmsListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase2EncryptionAlgorithmsListValue

NFData Phase2EncryptionAlgorithmsRequestListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase2EncryptionAlgorithmsRequestListValue

NFData Phase2IntegrityAlgorithmsListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase2IntegrityAlgorithmsListValue

NFData Phase2IntegrityAlgorithmsRequestListValue 
Instance details

Defined in Amazonka.EC2.Types.Phase2IntegrityAlgorithmsRequestListValue

NFData Placement 
Instance details

Defined in Amazonka.EC2.Types.Placement

Methods

rnf :: Placement -> () #

NFData PlacementGroup 
Instance details

Defined in Amazonka.EC2.Types.PlacementGroup

Methods

rnf :: PlacementGroup -> () #

NFData PlacementGroupInfo 
Instance details

Defined in Amazonka.EC2.Types.PlacementGroupInfo

Methods

rnf :: PlacementGroupInfo -> () #

NFData PlacementGroupState 
Instance details

Defined in Amazonka.EC2.Types.PlacementGroupState

Methods

rnf :: PlacementGroupState -> () #

NFData PlacementGroupStrategy 
Instance details

Defined in Amazonka.EC2.Types.PlacementGroupStrategy

Methods

rnf :: PlacementGroupStrategy -> () #

NFData PlacementResponse 
Instance details

Defined in Amazonka.EC2.Types.PlacementResponse

Methods

rnf :: PlacementResponse -> () #

NFData PlacementStrategy 
Instance details

Defined in Amazonka.EC2.Types.PlacementStrategy

Methods

rnf :: PlacementStrategy -> () #

NFData PlatformValues 
Instance details

Defined in Amazonka.EC2.Types.PlatformValues

Methods

rnf :: PlatformValues -> () #

NFData PoolCidrBlock 
Instance details

Defined in Amazonka.EC2.Types.PoolCidrBlock

Methods

rnf :: PoolCidrBlock -> () #

NFData PortRange 
Instance details

Defined in Amazonka.EC2.Types.PortRange

Methods

rnf :: PortRange -> () #

NFData PrefixList 
Instance details

Defined in Amazonka.EC2.Types.PrefixList

Methods

rnf :: PrefixList -> () #

NFData PrefixListAssociation 
Instance details

Defined in Amazonka.EC2.Types.PrefixListAssociation

Methods

rnf :: PrefixListAssociation -> () #

NFData PrefixListEntry 
Instance details

Defined in Amazonka.EC2.Types.PrefixListEntry

Methods

rnf :: PrefixListEntry -> () #

NFData PrefixListId 
Instance details

Defined in Amazonka.EC2.Types.PrefixListId

Methods

rnf :: PrefixListId -> () #

NFData PrefixListState 
Instance details

Defined in Amazonka.EC2.Types.PrefixListState

Methods

rnf :: PrefixListState -> () #

NFData PriceSchedule 
Instance details

Defined in Amazonka.EC2.Types.PriceSchedule

Methods

rnf :: PriceSchedule -> () #

NFData PriceScheduleSpecification 
Instance details

Defined in Amazonka.EC2.Types.PriceScheduleSpecification

NFData PricingDetail 
Instance details

Defined in Amazonka.EC2.Types.PricingDetail

Methods

rnf :: PricingDetail -> () #

NFData PrincipalIdFormat 
Instance details

Defined in Amazonka.EC2.Types.PrincipalIdFormat

Methods

rnf :: PrincipalIdFormat -> () #

NFData PrincipalType 
Instance details

Defined in Amazonka.EC2.Types.PrincipalType

Methods

rnf :: PrincipalType -> () #

NFData PrivateDnsDetails 
Instance details

Defined in Amazonka.EC2.Types.PrivateDnsDetails

Methods

rnf :: PrivateDnsDetails -> () #

NFData PrivateDnsNameConfiguration 
Instance details

Defined in Amazonka.EC2.Types.PrivateDnsNameConfiguration

NFData PrivateDnsNameOptionsOnLaunch 
Instance details

Defined in Amazonka.EC2.Types.PrivateDnsNameOptionsOnLaunch

NFData PrivateDnsNameOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.PrivateDnsNameOptionsRequest

NFData PrivateDnsNameOptionsResponse 
Instance details

Defined in Amazonka.EC2.Types.PrivateDnsNameOptionsResponse

NFData PrivateIpAddressSpecification 
Instance details

Defined in Amazonka.EC2.Types.PrivateIpAddressSpecification

NFData ProcessorInfo 
Instance details

Defined in Amazonka.EC2.Types.ProcessorInfo

Methods

rnf :: ProcessorInfo -> () #

NFData ProductCode 
Instance details

Defined in Amazonka.EC2.Types.ProductCode

Methods

rnf :: ProductCode -> () #

NFData ProductCodeValues 
Instance details

Defined in Amazonka.EC2.Types.ProductCodeValues

Methods

rnf :: ProductCodeValues -> () #

NFData PropagatingVgw 
Instance details

Defined in Amazonka.EC2.Types.PropagatingVgw

Methods

rnf :: PropagatingVgw -> () #

NFData Protocol 
Instance details

Defined in Amazonka.EC2.Types.Protocol

Methods

rnf :: Protocol -> () #

NFData ProtocolValue 
Instance details

Defined in Amazonka.EC2.Types.ProtocolValue

Methods

rnf :: ProtocolValue -> () #

NFData ProvisionedBandwidth 
Instance details

Defined in Amazonka.EC2.Types.ProvisionedBandwidth

Methods

rnf :: ProvisionedBandwidth -> () #

NFData PtrUpdateStatus 
Instance details

Defined in Amazonka.EC2.Types.PtrUpdateStatus

Methods

rnf :: PtrUpdateStatus -> () #

NFData PublicIpv4Pool 
Instance details

Defined in Amazonka.EC2.Types.PublicIpv4Pool

Methods

rnf :: PublicIpv4Pool -> () #

NFData PublicIpv4PoolRange 
Instance details

Defined in Amazonka.EC2.Types.PublicIpv4PoolRange

Methods

rnf :: PublicIpv4PoolRange -> () #

NFData Purchase 
Instance details

Defined in Amazonka.EC2.Types.Purchase

Methods

rnf :: Purchase -> () #

NFData PurchaseRequest 
Instance details

Defined in Amazonka.EC2.Types.PurchaseRequest

Methods

rnf :: PurchaseRequest -> () #

NFData RIProductDescription 
Instance details

Defined in Amazonka.EC2.Types.RIProductDescription

Methods

rnf :: RIProductDescription -> () #

NFData RecurringCharge 
Instance details

Defined in Amazonka.EC2.Types.RecurringCharge

Methods

rnf :: RecurringCharge -> () #

NFData RecurringChargeFrequency 
Instance details

Defined in Amazonka.EC2.Types.RecurringChargeFrequency

NFData ReferencedSecurityGroup 
Instance details

Defined in Amazonka.EC2.Types.ReferencedSecurityGroup

Methods

rnf :: ReferencedSecurityGroup -> () #

NFData RegionInfo 
Instance details

Defined in Amazonka.EC2.Types.RegionInfo

Methods

rnf :: RegionInfo -> () #

NFData RegisterInstanceTagAttributeRequest 
Instance details

Defined in Amazonka.EC2.Types.RegisterInstanceTagAttributeRequest

NFData RemoveIpamOperatingRegion 
Instance details

Defined in Amazonka.EC2.Types.RemoveIpamOperatingRegion

NFData RemovePrefixListEntry 
Instance details

Defined in Amazonka.EC2.Types.RemovePrefixListEntry

Methods

rnf :: RemovePrefixListEntry -> () #

NFData ReplaceRootVolumeTask 
Instance details

Defined in Amazonka.EC2.Types.ReplaceRootVolumeTask

Methods

rnf :: ReplaceRootVolumeTask -> () #

NFData ReplaceRootVolumeTaskState 
Instance details

Defined in Amazonka.EC2.Types.ReplaceRootVolumeTaskState

NFData ReplacementStrategy 
Instance details

Defined in Amazonka.EC2.Types.ReplacementStrategy

Methods

rnf :: ReplacementStrategy -> () #

NFData ReportInstanceReasonCodes 
Instance details

Defined in Amazonka.EC2.Types.ReportInstanceReasonCodes

NFData ReportStatusType 
Instance details

Defined in Amazonka.EC2.Types.ReportStatusType

Methods

rnf :: ReportStatusType -> () #

NFData RequestIpamResourceTag 
Instance details

Defined in Amazonka.EC2.Types.RequestIpamResourceTag

Methods

rnf :: RequestIpamResourceTag -> () #

NFData RequestLaunchTemplateData 
Instance details

Defined in Amazonka.EC2.Types.RequestLaunchTemplateData

NFData RequestSpotLaunchSpecification 
Instance details

Defined in Amazonka.EC2.Types.RequestSpotLaunchSpecification

NFData Reservation 
Instance details

Defined in Amazonka.EC2.Types.Reservation

Methods

rnf :: Reservation -> () #

NFData ReservationFleetInstanceSpecification 
Instance details

Defined in Amazonka.EC2.Types.ReservationFleetInstanceSpecification

NFData ReservationState 
Instance details

Defined in Amazonka.EC2.Types.ReservationState

Methods

rnf :: ReservationState -> () #

NFData ReservationValue 
Instance details

Defined in Amazonka.EC2.Types.ReservationValue

Methods

rnf :: ReservationValue -> () #

NFData ReservedInstanceLimitPrice 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstanceLimitPrice

NFData ReservedInstanceReservationValue 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstanceReservationValue

NFData ReservedInstanceState 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstanceState

Methods

rnf :: ReservedInstanceState -> () #

NFData ReservedInstances 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstances

Methods

rnf :: ReservedInstances -> () #

NFData ReservedInstancesConfiguration 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstancesConfiguration

NFData ReservedInstancesId 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstancesId

Methods

rnf :: ReservedInstancesId -> () #

NFData ReservedInstancesListing 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstancesListing

NFData ReservedInstancesModification 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstancesModification

NFData ReservedInstancesModificationResult 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstancesModificationResult

NFData ReservedInstancesOffering 
Instance details

Defined in Amazonka.EC2.Types.ReservedInstancesOffering

NFData ResetFpgaImageAttributeName 
Instance details

Defined in Amazonka.EC2.Types.ResetFpgaImageAttributeName

NFData ResetImageAttributeName 
Instance details

Defined in Amazonka.EC2.Types.ResetImageAttributeName

Methods

rnf :: ResetImageAttributeName -> () #

NFData ResourceStatement 
Instance details

Defined in Amazonka.EC2.Types.ResourceStatement

Methods

rnf :: ResourceStatement -> () #

NFData ResourceStatementRequest 
Instance details

Defined in Amazonka.EC2.Types.ResourceStatementRequest

NFData ResourceType 
Instance details

Defined in Amazonka.EC2.Types.ResourceType

Methods

rnf :: ResourceType -> () #

NFData ResponseError 
Instance details

Defined in Amazonka.EC2.Types.ResponseError

Methods

rnf :: ResponseError -> () #

NFData ResponseLaunchTemplateData 
Instance details

Defined in Amazonka.EC2.Types.ResponseLaunchTemplateData

NFData RootDeviceType 
Instance details

Defined in Amazonka.EC2.Types.RootDeviceType

Methods

rnf :: RootDeviceType -> () #

NFData Route 
Instance details

Defined in Amazonka.EC2.Types.Route

Methods

rnf :: Route -> () #

NFData RouteOrigin 
Instance details

Defined in Amazonka.EC2.Types.RouteOrigin

Methods

rnf :: RouteOrigin -> () #

NFData RouteState 
Instance details

Defined in Amazonka.EC2.Types.RouteState

Methods

rnf :: RouteState -> () #

NFData RouteTable 
Instance details

Defined in Amazonka.EC2.Types.RouteTable

Methods

rnf :: RouteTable -> () #

NFData RouteTableAssociation 
Instance details

Defined in Amazonka.EC2.Types.RouteTableAssociation

Methods

rnf :: RouteTableAssociation -> () #

NFData RouteTableAssociationState 
Instance details

Defined in Amazonka.EC2.Types.RouteTableAssociationState

NFData RouteTableAssociationStateCode 
Instance details

Defined in Amazonka.EC2.Types.RouteTableAssociationStateCode

NFData RuleAction 
Instance details

Defined in Amazonka.EC2.Types.RuleAction

Methods

rnf :: RuleAction -> () #

NFData RunInstancesMonitoringEnabled 
Instance details

Defined in Amazonka.EC2.Types.RunInstancesMonitoringEnabled

NFData S3ObjectTag 
Instance details

Defined in Amazonka.EC2.Types.S3ObjectTag

Methods

rnf :: S3ObjectTag -> () #

NFData S3Storage 
Instance details

Defined in Amazonka.EC2.Types.S3Storage

Methods

rnf :: S3Storage -> () #

NFData ScheduledInstance 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstance

Methods

rnf :: ScheduledInstance -> () #

NFData ScheduledInstanceAvailability 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstanceAvailability

NFData ScheduledInstanceRecurrence 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstanceRecurrence

NFData ScheduledInstanceRecurrenceRequest 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstanceRecurrenceRequest

NFData ScheduledInstancesBlockDeviceMapping 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesBlockDeviceMapping

NFData ScheduledInstancesEbs 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesEbs

Methods

rnf :: ScheduledInstancesEbs -> () #

NFData ScheduledInstancesIamInstanceProfile 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesIamInstanceProfile

NFData ScheduledInstancesIpv6Address 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesIpv6Address

NFData ScheduledInstancesLaunchSpecification 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesLaunchSpecification

NFData ScheduledInstancesMonitoring 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesMonitoring

NFData ScheduledInstancesNetworkInterface 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesNetworkInterface

NFData ScheduledInstancesPlacement 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesPlacement

NFData ScheduledInstancesPrivateIpAddressConfig 
Instance details

Defined in Amazonka.EC2.Types.ScheduledInstancesPrivateIpAddressConfig

NFData Scope 
Instance details

Defined in Amazonka.EC2.Types.Scope

Methods

rnf :: Scope -> () #

NFData SecurityGroup 
Instance details

Defined in Amazonka.EC2.Types.SecurityGroup

Methods

rnf :: SecurityGroup -> () #

NFData SecurityGroupIdentifier 
Instance details

Defined in Amazonka.EC2.Types.SecurityGroupIdentifier

Methods

rnf :: SecurityGroupIdentifier -> () #

NFData SecurityGroupReference 
Instance details

Defined in Amazonka.EC2.Types.SecurityGroupReference

Methods

rnf :: SecurityGroupReference -> () #

NFData SecurityGroupRule 
Instance details

Defined in Amazonka.EC2.Types.SecurityGroupRule

Methods

rnf :: SecurityGroupRule -> () #

NFData SecurityGroupRuleDescription 
Instance details

Defined in Amazonka.EC2.Types.SecurityGroupRuleDescription

NFData SecurityGroupRuleRequest 
Instance details

Defined in Amazonka.EC2.Types.SecurityGroupRuleRequest

NFData SecurityGroupRuleUpdate 
Instance details

Defined in Amazonka.EC2.Types.SecurityGroupRuleUpdate

Methods

rnf :: SecurityGroupRuleUpdate -> () #

NFData SelfServicePortal 
Instance details

Defined in Amazonka.EC2.Types.SelfServicePortal

Methods

rnf :: SelfServicePortal -> () #

NFData ServiceConfiguration 
Instance details

Defined in Amazonka.EC2.Types.ServiceConfiguration

Methods

rnf :: ServiceConfiguration -> () #

NFData ServiceConnectivityType 
Instance details

Defined in Amazonka.EC2.Types.ServiceConnectivityType

Methods

rnf :: ServiceConnectivityType -> () #

NFData ServiceDetail 
Instance details

Defined in Amazonka.EC2.Types.ServiceDetail

Methods

rnf :: ServiceDetail -> () #

NFData ServiceState 
Instance details

Defined in Amazonka.EC2.Types.ServiceState

Methods

rnf :: ServiceState -> () #

NFData ServiceType 
Instance details

Defined in Amazonka.EC2.Types.ServiceType

Methods

rnf :: ServiceType -> () #

NFData ServiceTypeDetail 
Instance details

Defined in Amazonka.EC2.Types.ServiceTypeDetail

Methods

rnf :: ServiceTypeDetail -> () #

NFData ShutdownBehavior 
Instance details

Defined in Amazonka.EC2.Types.ShutdownBehavior

Methods

rnf :: ShutdownBehavior -> () #

NFData SlotDateTimeRangeRequest 
Instance details

Defined in Amazonka.EC2.Types.SlotDateTimeRangeRequest

NFData SlotStartTimeRangeRequest 
Instance details

Defined in Amazonka.EC2.Types.SlotStartTimeRangeRequest

NFData Snapshot 
Instance details

Defined in Amazonka.EC2.Types.Snapshot

Methods

rnf :: Snapshot -> () #

NFData SnapshotAttributeName 
Instance details

Defined in Amazonka.EC2.Types.SnapshotAttributeName

Methods

rnf :: SnapshotAttributeName -> () #

NFData SnapshotDetail 
Instance details

Defined in Amazonka.EC2.Types.SnapshotDetail

Methods

rnf :: SnapshotDetail -> () #

NFData SnapshotDiskContainer 
Instance details

Defined in Amazonka.EC2.Types.SnapshotDiskContainer

Methods

rnf :: SnapshotDiskContainer -> () #

NFData SnapshotInfo 
Instance details

Defined in Amazonka.EC2.Types.SnapshotInfo

Methods

rnf :: SnapshotInfo -> () #

NFData SnapshotRecycleBinInfo 
Instance details

Defined in Amazonka.EC2.Types.SnapshotRecycleBinInfo

Methods

rnf :: SnapshotRecycleBinInfo -> () #

NFData SnapshotState 
Instance details

Defined in Amazonka.EC2.Types.SnapshotState

Methods

rnf :: SnapshotState -> () #

NFData SnapshotTaskDetail 
Instance details

Defined in Amazonka.EC2.Types.SnapshotTaskDetail

Methods

rnf :: SnapshotTaskDetail -> () #

NFData SnapshotTierStatus 
Instance details

Defined in Amazonka.EC2.Types.SnapshotTierStatus

Methods

rnf :: SnapshotTierStatus -> () #

NFData SpotAllocationStrategy 
Instance details

Defined in Amazonka.EC2.Types.SpotAllocationStrategy

Methods

rnf :: SpotAllocationStrategy -> () #

NFData SpotCapacityRebalance 
Instance details

Defined in Amazonka.EC2.Types.SpotCapacityRebalance

Methods

rnf :: SpotCapacityRebalance -> () #

NFData SpotDatafeedSubscription 
Instance details

Defined in Amazonka.EC2.Types.SpotDatafeedSubscription

NFData SpotFleetLaunchSpecification 
Instance details

Defined in Amazonka.EC2.Types.SpotFleetLaunchSpecification

NFData SpotFleetMonitoring 
Instance details

Defined in Amazonka.EC2.Types.SpotFleetMonitoring

Methods

rnf :: SpotFleetMonitoring -> () #

NFData SpotFleetRequestConfig 
Instance details

Defined in Amazonka.EC2.Types.SpotFleetRequestConfig

Methods

rnf :: SpotFleetRequestConfig -> () #

NFData SpotFleetRequestConfigData 
Instance details

Defined in Amazonka.EC2.Types.SpotFleetRequestConfigData

NFData SpotFleetTagSpecification 
Instance details

Defined in Amazonka.EC2.Types.SpotFleetTagSpecification

NFData SpotInstanceInterruptionBehavior 
Instance details

Defined in Amazonka.EC2.Types.SpotInstanceInterruptionBehavior

NFData SpotInstanceRequest 
Instance details

Defined in Amazonka.EC2.Types.SpotInstanceRequest

Methods

rnf :: SpotInstanceRequest -> () #

NFData SpotInstanceState 
Instance details

Defined in Amazonka.EC2.Types.SpotInstanceState

Methods

rnf :: SpotInstanceState -> () #

NFData SpotInstanceStateFault 
Instance details

Defined in Amazonka.EC2.Types.SpotInstanceStateFault

Methods

rnf :: SpotInstanceStateFault -> () #

NFData SpotInstanceStatus 
Instance details

Defined in Amazonka.EC2.Types.SpotInstanceStatus

Methods

rnf :: SpotInstanceStatus -> () #

NFData SpotInstanceType 
Instance details

Defined in Amazonka.EC2.Types.SpotInstanceType

Methods

rnf :: SpotInstanceType -> () #

NFData SpotMaintenanceStrategies 
Instance details

Defined in Amazonka.EC2.Types.SpotMaintenanceStrategies

NFData SpotMarketOptions 
Instance details

Defined in Amazonka.EC2.Types.SpotMarketOptions

Methods

rnf :: SpotMarketOptions -> () #

NFData SpotOptions 
Instance details

Defined in Amazonka.EC2.Types.SpotOptions

Methods

rnf :: SpotOptions -> () #

NFData SpotOptionsRequest 
Instance details

Defined in Amazonka.EC2.Types.SpotOptionsRequest

Methods

rnf :: SpotOptionsRequest -> () #

NFData SpotPlacement 
Instance details

Defined in Amazonka.EC2.Types.SpotPlacement

Methods

rnf :: SpotPlacement -> () #

NFData SpotPlacementScore 
Instance details

Defined in Amazonka.EC2.Types.SpotPlacementScore

Methods

rnf :: SpotPlacementScore -> () #

NFData SpotPrice 
Instance details

Defined in Amazonka.EC2.Types.SpotPrice

Methods

rnf :: SpotPrice -> () #

NFData SpreadLevel 
Instance details

Defined in Amazonka.EC2.Types.SpreadLevel

Methods

rnf :: SpreadLevel -> () #

NFData StaleIpPermission 
Instance details

Defined in Amazonka.EC2.Types.StaleIpPermission

Methods

rnf :: StaleIpPermission -> () #

NFData StaleSecurityGroup 
Instance details

Defined in Amazonka.EC2.Types.StaleSecurityGroup

Methods

rnf :: StaleSecurityGroup -> () #

NFData State 
Instance details

Defined in Amazonka.EC2.Types.State

Methods

rnf :: State -> () #

NFData StateReason 
Instance details

Defined in Amazonka.EC2.Types.StateReason

Methods

rnf :: StateReason -> () #

NFData StaticSourcesSupportValue 
Instance details

Defined in Amazonka.EC2.Types.StaticSourcesSupportValue

NFData StatisticType 
Instance details

Defined in Amazonka.EC2.Types.StatisticType

Methods

rnf :: StatisticType -> () #

NFData StatusName 
Instance details

Defined in Amazonka.EC2.Types.StatusName

Methods

rnf :: StatusName -> () #

NFData StatusType 
Instance details

Defined in Amazonka.EC2.Types.StatusType

Methods

rnf :: StatusType -> () #

NFData Storage 
Instance details

Defined in Amazonka.EC2.Types.Storage

Methods

rnf :: Storage -> () #

NFData StorageLocation 
Instance details

Defined in Amazonka.EC2.Types.StorageLocation

Methods

rnf :: StorageLocation -> () #

NFData StorageTier 
Instance details

Defined in Amazonka.EC2.Types.StorageTier

Methods

rnf :: StorageTier -> () #

NFData StoreImageTaskResult 
Instance details

Defined in Amazonka.EC2.Types.StoreImageTaskResult

Methods

rnf :: StoreImageTaskResult -> () #

NFData Subnet 
Instance details

Defined in Amazonka.EC2.Types.Subnet

Methods

rnf :: Subnet -> () #

NFData SubnetAssociation 
Instance details

Defined in Amazonka.EC2.Types.SubnetAssociation

Methods

rnf :: SubnetAssociation -> () #

NFData SubnetCidrBlockState 
Instance details

Defined in Amazonka.EC2.Types.SubnetCidrBlockState

Methods

rnf :: SubnetCidrBlockState -> () #

NFData SubnetCidrBlockStateCode 
Instance details

Defined in Amazonka.EC2.Types.SubnetCidrBlockStateCode

NFData SubnetCidrReservation 
Instance details

Defined in Amazonka.EC2.Types.SubnetCidrReservation

Methods

rnf :: SubnetCidrReservation -> () #

NFData SubnetCidrReservationType 
Instance details

Defined in Amazonka.EC2.Types.SubnetCidrReservationType

NFData SubnetIpv6CidrBlockAssociation 
Instance details

Defined in Amazonka.EC2.Types.SubnetIpv6CidrBlockAssociation

NFData SubnetState 
Instance details

Defined in Amazonka.EC2.Types.SubnetState

Methods

rnf :: SubnetState -> () #

NFData Subscription 
Instance details

Defined in Amazonka.EC2.Types.Subscription

Methods

rnf :: Subscription -> () #

NFData SuccessfulInstanceCreditSpecificationItem 
Instance details

Defined in Amazonka.EC2.Types.SuccessfulInstanceCreditSpecificationItem

NFData SuccessfulQueuedPurchaseDeletion 
Instance details

Defined in Amazonka.EC2.Types.SuccessfulQueuedPurchaseDeletion

NFData SummaryStatus 
Instance details

Defined in Amazonka.EC2.Types.SummaryStatus

Methods

rnf :: SummaryStatus -> () #

NFData Tag 
Instance details

Defined in Amazonka.EC2.Types.Tag

Methods

rnf :: Tag -> () #

NFData TagDescription 
Instance details

Defined in Amazonka.EC2.Types.TagDescription

Methods

rnf :: TagDescription -> () #

NFData TagSpecification 
Instance details

Defined in Amazonka.EC2.Types.TagSpecification

Methods

rnf :: TagSpecification -> () #

NFData TargetCapacitySpecification 
Instance details

Defined in Amazonka.EC2.Types.TargetCapacitySpecification

NFData TargetCapacitySpecificationRequest 
Instance details

Defined in Amazonka.EC2.Types.TargetCapacitySpecificationRequest

NFData TargetCapacityUnitType 
Instance details

Defined in Amazonka.EC2.Types.TargetCapacityUnitType

Methods

rnf :: TargetCapacityUnitType -> () #

NFData TargetConfiguration 
Instance details

Defined in Amazonka.EC2.Types.TargetConfiguration

Methods

rnf :: TargetConfiguration -> () #

NFData TargetConfigurationRequest 
Instance details

Defined in Amazonka.EC2.Types.TargetConfigurationRequest

NFData TargetGroup 
Instance details

Defined in Amazonka.EC2.Types.TargetGroup

Methods

rnf :: TargetGroup -> () #

NFData TargetGroupsConfig 
Instance details

Defined in Amazonka.EC2.Types.TargetGroupsConfig

Methods

rnf :: TargetGroupsConfig -> () #

NFData TargetNetwork 
Instance details

Defined in Amazonka.EC2.Types.TargetNetwork

Methods

rnf :: TargetNetwork -> () #

NFData TargetReservationValue 
Instance details

Defined in Amazonka.EC2.Types.TargetReservationValue

Methods

rnf :: TargetReservationValue -> () #

NFData TargetStorageTier 
Instance details

Defined in Amazonka.EC2.Types.TargetStorageTier

Methods

rnf :: TargetStorageTier -> () #

NFData TelemetryStatus 
Instance details

Defined in Amazonka.EC2.Types.TelemetryStatus

Methods

rnf :: TelemetryStatus -> () #

NFData Tenancy 
Instance details

Defined in Amazonka.EC2.Types.Tenancy

Methods

rnf :: Tenancy -> () #

NFData TerminateConnectionStatus 
Instance details

Defined in Amazonka.EC2.Types.TerminateConnectionStatus

NFData ThroughResourcesStatement 
Instance details

Defined in Amazonka.EC2.Types.ThroughResourcesStatement

NFData ThroughResourcesStatementRequest 
Instance details

Defined in Amazonka.EC2.Types.ThroughResourcesStatementRequest

NFData TieringOperationStatus 
Instance details

Defined in Amazonka.EC2.Types.TieringOperationStatus

Methods

rnf :: TieringOperationStatus -> () #

NFData TotalLocalStorageGB 
Instance details

Defined in Amazonka.EC2.Types.TotalLocalStorageGB

Methods

rnf :: TotalLocalStorageGB -> () #

NFData TotalLocalStorageGBRequest 
Instance details

Defined in Amazonka.EC2.Types.TotalLocalStorageGBRequest

NFData TpmSupportValues 
Instance details

Defined in Amazonka.EC2.Types.TpmSupportValues

Methods

rnf :: TpmSupportValues -> () #

NFData TrafficDirection 
Instance details

Defined in Amazonka.EC2.Types.TrafficDirection

Methods

rnf :: TrafficDirection -> () #

NFData TrafficMirrorFilter 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorFilter

Methods

rnf :: TrafficMirrorFilter -> () #

NFData TrafficMirrorFilterRule 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorFilterRule

Methods

rnf :: TrafficMirrorFilterRule -> () #

NFData TrafficMirrorFilterRuleField 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorFilterRuleField

NFData TrafficMirrorNetworkService 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorNetworkService

NFData TrafficMirrorPortRange 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorPortRange

Methods

rnf :: TrafficMirrorPortRange -> () #

NFData TrafficMirrorPortRangeRequest 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorPortRangeRequest

NFData TrafficMirrorRuleAction 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorRuleAction

Methods

rnf :: TrafficMirrorRuleAction -> () #

NFData TrafficMirrorSession 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorSession

Methods

rnf :: TrafficMirrorSession -> () #

NFData TrafficMirrorSessionField 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorSessionField

NFData TrafficMirrorTarget 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorTarget

Methods

rnf :: TrafficMirrorTarget -> () #

NFData TrafficMirrorTargetType 
Instance details

Defined in Amazonka.EC2.Types.TrafficMirrorTargetType

Methods

rnf :: TrafficMirrorTargetType -> () #

NFData TrafficType 
Instance details

Defined in Amazonka.EC2.Types.TrafficType

Methods

rnf :: TrafficType -> () #

NFData TransitGateway 
Instance details

Defined in Amazonka.EC2.Types.TransitGateway

Methods

rnf :: TransitGateway -> () #

NFData TransitGatewayAssociation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAssociation

NFData TransitGatewayAssociationState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAssociationState

NFData TransitGatewayAttachment 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAttachment

NFData TransitGatewayAttachmentAssociation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAttachmentAssociation

NFData TransitGatewayAttachmentBgpConfiguration 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAttachmentBgpConfiguration

NFData TransitGatewayAttachmentPropagation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAttachmentPropagation

NFData TransitGatewayAttachmentResourceType 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAttachmentResourceType

NFData TransitGatewayAttachmentState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayAttachmentState

NFData TransitGatewayConnect 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayConnect

Methods

rnf :: TransitGatewayConnect -> () #

NFData TransitGatewayConnectOptions 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayConnectOptions

NFData TransitGatewayConnectPeer 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayConnectPeer

NFData TransitGatewayConnectPeerConfiguration 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayConnectPeerConfiguration

NFData TransitGatewayConnectPeerState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayConnectPeerState

NFData TransitGatewayConnectRequestBgpOptions 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayConnectRequestBgpOptions

NFData TransitGatewayMulitcastDomainAssociationState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulitcastDomainAssociationState

NFData TransitGatewayMulticastDeregisteredGroupMembers 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastDeregisteredGroupMembers

NFData TransitGatewayMulticastDeregisteredGroupSources 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastDeregisteredGroupSources

NFData TransitGatewayMulticastDomain 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastDomain

NFData TransitGatewayMulticastDomainAssociation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastDomainAssociation

NFData TransitGatewayMulticastDomainAssociations 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastDomainAssociations

NFData TransitGatewayMulticastDomainOptions 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastDomainOptions

NFData TransitGatewayMulticastDomainState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastDomainState

NFData TransitGatewayMulticastGroup 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastGroup

NFData TransitGatewayMulticastRegisteredGroupMembers 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastRegisteredGroupMembers

NFData TransitGatewayMulticastRegisteredGroupSources 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayMulticastRegisteredGroupSources

NFData TransitGatewayOptions 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayOptions

Methods

rnf :: TransitGatewayOptions -> () #

NFData TransitGatewayPeeringAttachment 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPeeringAttachment

NFData TransitGatewayPeeringAttachmentOptions 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPeeringAttachmentOptions

NFData TransitGatewayPolicyRule 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPolicyRule

NFData TransitGatewayPolicyRuleMetaData 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPolicyRuleMetaData

NFData TransitGatewayPolicyTable 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPolicyTable

NFData TransitGatewayPolicyTableAssociation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPolicyTableAssociation

NFData TransitGatewayPolicyTableEntry 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPolicyTableEntry

NFData TransitGatewayPolicyTableState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPolicyTableState

NFData TransitGatewayPrefixListAttachment 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPrefixListAttachment

NFData TransitGatewayPrefixListReference 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPrefixListReference

NFData TransitGatewayPrefixListReferenceState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPrefixListReferenceState

NFData TransitGatewayPropagation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPropagation

NFData TransitGatewayPropagationState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayPropagationState

NFData TransitGatewayRequestOptions 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRequestOptions

NFData TransitGatewayRoute 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRoute

Methods

rnf :: TransitGatewayRoute -> () #

NFData TransitGatewayRouteAttachment 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteAttachment

NFData TransitGatewayRouteState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteState

NFData TransitGatewayRouteTable 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTable

NFData TransitGatewayRouteTableAnnouncement 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTableAnnouncement

NFData TransitGatewayRouteTableAnnouncementDirection 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTableAnnouncementDirection

NFData TransitGatewayRouteTableAnnouncementState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTableAnnouncementState

NFData TransitGatewayRouteTableAssociation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTableAssociation

NFData TransitGatewayRouteTablePropagation 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTablePropagation

NFData TransitGatewayRouteTableRoute 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTableRoute

NFData TransitGatewayRouteTableState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteTableState

NFData TransitGatewayRouteType 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayRouteType

Methods

rnf :: TransitGatewayRouteType -> () #

NFData TransitGatewayState 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayState

Methods

rnf :: TransitGatewayState -> () #

NFData TransitGatewayVpcAttachment 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayVpcAttachment

NFData TransitGatewayVpcAttachmentOptions 
Instance details

Defined in Amazonka.EC2.Types.TransitGatewayVpcAttachmentOptions

NFData TransportProtocol 
Instance details

Defined in Amazonka.EC2.Types.TransportProtocol

Methods

rnf :: TransportProtocol -> () #

NFData TrunkInterfaceAssociation 
Instance details

Defined in Amazonka.EC2.Types.TrunkInterfaceAssociation

NFData TrustProviderType 
Instance details

Defined in Amazonka.EC2.Types.TrustProviderType

Methods

rnf :: TrustProviderType -> () #

NFData TunnelInsideIpVersion 
Instance details

Defined in Amazonka.EC2.Types.TunnelInsideIpVersion

Methods

rnf :: TunnelInsideIpVersion -> () #

NFData TunnelOption 
Instance details

Defined in Amazonka.EC2.Types.TunnelOption

Methods

rnf :: TunnelOption -> () #

NFData UnlimitedSupportedInstanceFamily 
Instance details

Defined in Amazonka.EC2.Types.UnlimitedSupportedInstanceFamily

NFData UnsuccessfulInstanceCreditSpecificationErrorCode 
Instance details

Defined in Amazonka.EC2.Types.UnsuccessfulInstanceCreditSpecificationErrorCode

NFData UnsuccessfulInstanceCreditSpecificationItem 
Instance details

Defined in Amazonka.EC2.Types.UnsuccessfulInstanceCreditSpecificationItem

NFData UnsuccessfulInstanceCreditSpecificationItemError 
Instance details

Defined in Amazonka.EC2.Types.UnsuccessfulInstanceCreditSpecificationItemError

NFData UnsuccessfulItem 
Instance details

Defined in Amazonka.EC2.Types.UnsuccessfulItem

Methods

rnf :: UnsuccessfulItem -> () #

NFData UnsuccessfulItemError 
Instance details

Defined in Amazonka.EC2.Types.UnsuccessfulItemError

Methods

rnf :: UnsuccessfulItemError -> () #

NFData UsageClassType 
Instance details

Defined in Amazonka.EC2.Types.UsageClassType

Methods

rnf :: UsageClassType -> () #

NFData UserBucket 
Instance details

Defined in Amazonka.EC2.Types.UserBucket

Methods

rnf :: UserBucket -> () #

NFData UserBucketDetails 
Instance details

Defined in Amazonka.EC2.Types.UserBucketDetails

Methods

rnf :: UserBucketDetails -> () #

NFData UserData 
Instance details

Defined in Amazonka.EC2.Types.UserData

Methods

rnf :: UserData -> () #

NFData UserIdGroupPair 
Instance details

Defined in Amazonka.EC2.Types.UserIdGroupPair

Methods

rnf :: UserIdGroupPair -> () #

NFData UserTrustProviderType 
Instance details

Defined in Amazonka.EC2.Types.UserTrustProviderType

Methods

rnf :: UserTrustProviderType -> () #

NFData VCpuCountRange 
Instance details

Defined in Amazonka.EC2.Types.VCpuCountRange

Methods

rnf :: VCpuCountRange -> () #

NFData VCpuCountRangeRequest 
Instance details

Defined in Amazonka.EC2.Types.VCpuCountRangeRequest

Methods

rnf :: VCpuCountRangeRequest -> () #

NFData VCpuInfo 
Instance details

Defined in Amazonka.EC2.Types.VCpuInfo

Methods

rnf :: VCpuInfo -> () #

NFData ValidationError 
Instance details

Defined in Amazonka.EC2.Types.ValidationError

Methods

rnf :: ValidationError -> () #

NFData ValidationWarning 
Instance details

Defined in Amazonka.EC2.Types.ValidationWarning

Methods

rnf :: ValidationWarning -> () #

NFData VerifiedAccessEndpoint 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpoint

Methods

rnf :: VerifiedAccessEndpoint -> () #

NFData VerifiedAccessEndpointAttachmentType 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointAttachmentType

NFData VerifiedAccessEndpointEniOptions 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointEniOptions

NFData VerifiedAccessEndpointLoadBalancerOptions 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointLoadBalancerOptions

NFData VerifiedAccessEndpointProtocol 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointProtocol

NFData VerifiedAccessEndpointStatus 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointStatus

NFData VerifiedAccessEndpointStatusCode 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointStatusCode

NFData VerifiedAccessEndpointType 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessEndpointType

NFData VerifiedAccessGroup 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessGroup

Methods

rnf :: VerifiedAccessGroup -> () #

NFData VerifiedAccessInstance 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessInstance

Methods

rnf :: VerifiedAccessInstance -> () #

NFData VerifiedAccessInstanceLoggingConfiguration 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessInstanceLoggingConfiguration

NFData VerifiedAccessLogCloudWatchLogsDestination 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogCloudWatchLogsDestination

NFData VerifiedAccessLogCloudWatchLogsDestinationOptions 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogCloudWatchLogsDestinationOptions

NFData VerifiedAccessLogDeliveryStatus 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogDeliveryStatus

NFData VerifiedAccessLogDeliveryStatusCode 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogDeliveryStatusCode

NFData VerifiedAccessLogKinesisDataFirehoseDestination 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogKinesisDataFirehoseDestination

NFData VerifiedAccessLogKinesisDataFirehoseDestinationOptions 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogKinesisDataFirehoseDestinationOptions

NFData VerifiedAccessLogOptions 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogOptions

NFData VerifiedAccessLogS3Destination 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogS3Destination

NFData VerifiedAccessLogS3DestinationOptions 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogS3DestinationOptions

NFData VerifiedAccessLogs 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessLogs

Methods

rnf :: VerifiedAccessLogs -> () #

NFData VerifiedAccessTrustProvider 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessTrustProvider

NFData VerifiedAccessTrustProviderCondensed 
Instance details

Defined in Amazonka.EC2.Types.VerifiedAccessTrustProviderCondensed

NFData VgwTelemetry 
Instance details

Defined in Amazonka.EC2.Types.VgwTelemetry

Methods

rnf :: VgwTelemetry -> () #

NFData VirtualizationType 
Instance details

Defined in Amazonka.EC2.Types.VirtualizationType

Methods

rnf :: VirtualizationType -> () #

NFData Volume 
Instance details

Defined in Amazonka.EC2.Types.Volume

Methods

rnf :: Volume -> () #

NFData VolumeAttachment 
Instance details

Defined in Amazonka.EC2.Types.VolumeAttachment

Methods

rnf :: VolumeAttachment -> () #

NFData VolumeAttachmentState 
Instance details

Defined in Amazonka.EC2.Types.VolumeAttachmentState

Methods

rnf :: VolumeAttachmentState -> () #

NFData VolumeAttributeName 
Instance details

Defined in Amazonka.EC2.Types.VolumeAttributeName

Methods

rnf :: VolumeAttributeName -> () #

NFData VolumeDetail 
Instance details

Defined in Amazonka.EC2.Types.VolumeDetail

Methods

rnf :: VolumeDetail -> () #

NFData VolumeModification 
Instance details

Defined in Amazonka.EC2.Types.VolumeModification

Methods

rnf :: VolumeModification -> () #

NFData VolumeModificationState 
Instance details

Defined in Amazonka.EC2.Types.VolumeModificationState

Methods

rnf :: VolumeModificationState -> () #

NFData VolumeState 
Instance details

Defined in Amazonka.EC2.Types.VolumeState

Methods

rnf :: VolumeState -> () #

NFData VolumeStatusAction 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusAction

Methods

rnf :: VolumeStatusAction -> () #

NFData VolumeStatusAttachmentStatus 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusAttachmentStatus

NFData VolumeStatusDetails 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusDetails

Methods

rnf :: VolumeStatusDetails -> () #

NFData VolumeStatusEvent 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusEvent

Methods

rnf :: VolumeStatusEvent -> () #

NFData VolumeStatusInfo 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusInfo

Methods

rnf :: VolumeStatusInfo -> () #

NFData VolumeStatusInfoStatus 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusInfoStatus

Methods

rnf :: VolumeStatusInfoStatus -> () #

NFData VolumeStatusItem 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusItem

Methods

rnf :: VolumeStatusItem -> () #

NFData VolumeStatusName 
Instance details

Defined in Amazonka.EC2.Types.VolumeStatusName

Methods

rnf :: VolumeStatusName -> () #

NFData VolumeType 
Instance details

Defined in Amazonka.EC2.Types.VolumeType

Methods

rnf :: VolumeType -> () #

NFData Vpc 
Instance details

Defined in Amazonka.EC2.Types.Vpc

Methods

rnf :: Vpc -> () #

NFData VpcAttachment 
Instance details

Defined in Amazonka.EC2.Types.VpcAttachment

Methods

rnf :: VpcAttachment -> () #

NFData VpcAttributeName 
Instance details

Defined in Amazonka.EC2.Types.VpcAttributeName

Methods

rnf :: VpcAttributeName -> () #

NFData VpcCidrBlockAssociation 
Instance details

Defined in Amazonka.EC2.Types.VpcCidrBlockAssociation

Methods

rnf :: VpcCidrBlockAssociation -> () #

NFData VpcCidrBlockState 
Instance details

Defined in Amazonka.EC2.Types.VpcCidrBlockState

Methods

rnf :: VpcCidrBlockState -> () #

NFData VpcCidrBlockStateCode 
Instance details

Defined in Amazonka.EC2.Types.VpcCidrBlockStateCode

Methods

rnf :: VpcCidrBlockStateCode -> () #

NFData VpcClassicLink 
Instance details

Defined in Amazonka.EC2.Types.VpcClassicLink

Methods

rnf :: VpcClassicLink -> () #

NFData VpcEndpoint 
Instance details

Defined in Amazonka.EC2.Types.VpcEndpoint

Methods

rnf :: VpcEndpoint -> () #

NFData VpcEndpointConnection 
Instance details

Defined in Amazonka.EC2.Types.VpcEndpointConnection

Methods

rnf :: VpcEndpointConnection -> () #

NFData VpcEndpointType 
Instance details

Defined in Amazonka.EC2.Types.VpcEndpointType

Methods

rnf :: VpcEndpointType -> () #

NFData VpcIpv6CidrBlockAssociation 
Instance details

Defined in Amazonka.EC2.Types.VpcIpv6CidrBlockAssociation

NFData VpcPeeringConnection 
Instance details

Defined in Amazonka.EC2.Types.VpcPeeringConnection

Methods

rnf :: VpcPeeringConnection -> () #

NFData VpcPeeringConnectionOptionsDescription 
Instance details

Defined in Amazonka.EC2.Types.VpcPeeringConnectionOptionsDescription

NFData VpcPeeringConnectionStateReason 
Instance details

Defined in Amazonka.EC2.Types.VpcPeeringConnectionStateReason

NFData VpcPeeringConnectionStateReasonCode 
Instance details

Defined in Amazonka.EC2.Types.VpcPeeringConnectionStateReasonCode

NFData VpcPeeringConnectionVpcInfo 
Instance details

Defined in Amazonka.EC2.Types.VpcPeeringConnectionVpcInfo

NFData VpcState 
Instance details

Defined in Amazonka.EC2.Types.VpcState

Methods

rnf :: VpcState -> () #

NFData VpcTenancy 
Instance details

Defined in Amazonka.EC2.Types.VpcTenancy

Methods

rnf :: VpcTenancy -> () #

NFData VpnConnection 
Instance details

Defined in Amazonka.EC2.Types.VpnConnection

Methods

rnf :: VpnConnection -> () #

NFData VpnConnectionDeviceType 
Instance details

Defined in Amazonka.EC2.Types.VpnConnectionDeviceType

Methods

rnf :: VpnConnectionDeviceType -> () #

NFData VpnConnectionOptions 
Instance details

Defined in Amazonka.EC2.Types.VpnConnectionOptions

Methods

rnf :: VpnConnectionOptions -> () #

NFData VpnConnectionOptionsSpecification 
Instance details

Defined in Amazonka.EC2.Types.VpnConnectionOptionsSpecification

NFData VpnEcmpSupportValue 
Instance details

Defined in Amazonka.EC2.Types.VpnEcmpSupportValue

Methods

rnf :: VpnEcmpSupportValue -> () #

NFData VpnGateway 
Instance details

Defined in Amazonka.EC2.Types.VpnGateway

Methods

rnf :: VpnGateway -> () #

NFData VpnProtocol 
Instance details

Defined in Amazonka.EC2.Types.VpnProtocol

Methods

rnf :: VpnProtocol -> () #

NFData VpnState 
Instance details

Defined in Amazonka.EC2.Types.VpnState

Methods

rnf :: VpnState -> () #

NFData VpnStaticRoute 
Instance details

Defined in Amazonka.EC2.Types.VpnStaticRoute

Methods

rnf :: VpnStaticRoute -> () #

NFData VpnStaticRouteSource 
Instance details

Defined in Amazonka.EC2.Types.VpnStaticRouteSource

Methods

rnf :: VpnStaticRouteSource -> () #

NFData VpnTunnelLogOptions 
Instance details

Defined in Amazonka.EC2.Types.VpnTunnelLogOptions

Methods

rnf :: VpnTunnelLogOptions -> () #

NFData VpnTunnelLogOptionsSpecification 
Instance details

Defined in Amazonka.EC2.Types.VpnTunnelLogOptionsSpecification

NFData VpnTunnelOptionsSpecification 
Instance details

Defined in Amazonka.EC2.Types.VpnTunnelOptionsSpecification

NFData WeekDay 
Instance details

Defined in Amazonka.EC2.Types.WeekDay

Methods

rnf :: WeekDay -> () #

NFData Invoke 
Instance details

Defined in Amazonka.Lambda.Invoke

Methods

rnf :: Invoke -> () #

NFData InvokeResponse 
Instance details

Defined in Amazonka.Lambda.Invoke

Methods

rnf :: InvokeResponse -> () #

NFData AccountLimit 
Instance details

Defined in Amazonka.Lambda.Types.AccountLimit

Methods

rnf :: AccountLimit -> () #

NFData AccountUsage 
Instance details

Defined in Amazonka.Lambda.Types.AccountUsage

Methods

rnf :: AccountUsage -> () #

NFData AliasConfiguration 
Instance details

Defined in Amazonka.Lambda.Types.AliasConfiguration

Methods

rnf :: AliasConfiguration -> () #

NFData AliasRoutingConfiguration 
Instance details

Defined in Amazonka.Lambda.Types.AliasRoutingConfiguration

NFData AllowedPublishers 
Instance details

Defined in Amazonka.Lambda.Types.AllowedPublishers

Methods

rnf :: AllowedPublishers -> () #

NFData AmazonManagedKafkaEventSourceConfig 
Instance details

Defined in Amazonka.Lambda.Types.AmazonManagedKafkaEventSourceConfig

NFData Architecture 
Instance details

Defined in Amazonka.Lambda.Types.Architecture

Methods

rnf :: Architecture -> () #

NFData CodeSigningConfig 
Instance details

Defined in Amazonka.Lambda.Types.CodeSigningConfig

Methods

rnf :: CodeSigningConfig -> () #

NFData CodeSigningPolicies 
Instance details

Defined in Amazonka.Lambda.Types.CodeSigningPolicies

Methods

rnf :: CodeSigningPolicies -> () #

NFData CodeSigningPolicy 
Instance details

Defined in Amazonka.Lambda.Types.CodeSigningPolicy

Methods

rnf :: CodeSigningPolicy -> () #

NFData Concurrency 
Instance details

Defined in Amazonka.Lambda.Types.Concurrency

Methods

rnf :: Concurrency -> () #

NFData Cors 
Instance details

Defined in Amazonka.Lambda.Types.Cors

Methods

rnf :: Cors -> () #

NFData DeadLetterConfig 
Instance details

Defined in Amazonka.Lambda.Types.DeadLetterConfig

Methods

rnf :: DeadLetterConfig -> () #

NFData DestinationConfig 
Instance details

Defined in Amazonka.Lambda.Types.DestinationConfig

Methods

rnf :: DestinationConfig -> () #

NFData EndPointType 
Instance details

Defined in Amazonka.Lambda.Types.EndPointType

Methods

rnf :: EndPointType -> () #

NFData Environment 
Instance details

Defined in Amazonka.Lambda.Types.Environment

Methods

rnf :: Environment -> () #

NFData EnvironmentError 
Instance details

Defined in Amazonka.Lambda.Types.EnvironmentError

Methods

rnf :: EnvironmentError -> () #

NFData EnvironmentResponse 
Instance details

Defined in Amazonka.Lambda.Types.EnvironmentResponse

Methods

rnf :: EnvironmentResponse -> () #

NFData EphemeralStorage 
Instance details

Defined in Amazonka.Lambda.Types.EphemeralStorage

Methods

rnf :: EphemeralStorage -> () #

NFData EventSourceMappingConfiguration 
Instance details

Defined in Amazonka.Lambda.Types.EventSourceMappingConfiguration

NFData EventSourcePosition 
Instance details

Defined in Amazonka.Lambda.Types.EventSourcePosition

Methods

rnf :: EventSourcePosition -> () #

NFData FileSystemConfig 
Instance details

Defined in Amazonka.Lambda.Types.FileSystemConfig

Methods

rnf :: FileSystemConfig -> () #

NFData Filter 
Instance details

Defined in Amazonka.Lambda.Types.Filter

Methods

rnf :: Filter -> () #

NFData FilterCriteria 
Instance details

Defined in Amazonka.Lambda.Types.FilterCriteria

Methods

rnf :: FilterCriteria -> () #

NFData FunctionCode 
Instance details

Defined in Amazonka.Lambda.Types.FunctionCode

Methods

rnf :: FunctionCode -> () #

NFData FunctionCodeLocation 
Instance details

Defined in Amazonka.Lambda.Types.FunctionCodeLocation

Methods

rnf :: FunctionCodeLocation -> () #

NFData FunctionConfiguration 
Instance details

Defined in Amazonka.Lambda.Types.FunctionConfiguration

Methods

rnf :: FunctionConfiguration -> () #

NFData FunctionEventInvokeConfig 
Instance details

Defined in Amazonka.Lambda.Types.FunctionEventInvokeConfig

NFData FunctionResponseType 
Instance details

Defined in Amazonka.Lambda.Types.FunctionResponseType

Methods

rnf :: FunctionResponseType -> () #

NFData FunctionUrlAuthType 
Instance details

Defined in Amazonka.Lambda.Types.FunctionUrlAuthType

Methods

rnf :: FunctionUrlAuthType -> () #

NFData FunctionUrlConfig 
Instance details

Defined in Amazonka.Lambda.Types.FunctionUrlConfig

Methods

rnf :: FunctionUrlConfig -> () #

NFData FunctionVersion 
Instance details

Defined in Amazonka.Lambda.Types.FunctionVersion

Methods

rnf :: FunctionVersion -> () #

NFData GetLayerVersionResponse 
Instance details

Defined in Amazonka.Lambda.Types.GetLayerVersionResponse

Methods

rnf :: GetLayerVersionResponse -> () #

NFData ImageConfig 
Instance details

Defined in Amazonka.Lambda.Types.ImageConfig

Methods

rnf :: ImageConfig -> () #

NFData ImageConfigError 
Instance details

Defined in Amazonka.Lambda.Types.ImageConfigError

Methods

rnf :: ImageConfigError -> () #

NFData ImageConfigResponse 
Instance details

Defined in Amazonka.Lambda.Types.ImageConfigResponse

Methods

rnf :: ImageConfigResponse -> () #

NFData InvocationType 
Instance details

Defined in Amazonka.Lambda.Types.InvocationType

Methods

rnf :: InvocationType -> () #

NFData LastUpdateStatus 
Instance details

Defined in Amazonka.Lambda.Types.LastUpdateStatus

Methods

rnf :: LastUpdateStatus -> () #

NFData LastUpdateStatusReasonCode 
Instance details

Defined in Amazonka.Lambda.Types.LastUpdateStatusReasonCode

NFData Layer 
Instance details

Defined in Amazonka.Lambda.Types.Layer

Methods

rnf :: Layer -> () #

NFData LayerVersionContentInput 
Instance details

Defined in Amazonka.Lambda.Types.LayerVersionContentInput

NFData LayerVersionContentOutput 
Instance details

Defined in Amazonka.Lambda.Types.LayerVersionContentOutput

NFData LayerVersionsListItem 
Instance details

Defined in Amazonka.Lambda.Types.LayerVersionsListItem

Methods

rnf :: LayerVersionsListItem -> () #

NFData LayersListItem 
Instance details

Defined in Amazonka.Lambda.Types.LayersListItem

Methods

rnf :: LayersListItem -> () #

NFData LogType 
Instance details

Defined in Amazonka.Lambda.Types.LogType

Methods

rnf :: LogType -> () #

NFData OnFailure 
Instance details

Defined in Amazonka.Lambda.Types.OnFailure

Methods

rnf :: OnFailure -> () #

NFData OnSuccess 
Instance details

Defined in Amazonka.Lambda.Types.OnSuccess

Methods

rnf :: OnSuccess -> () #

NFData PackageType 
Instance details

Defined in Amazonka.Lambda.Types.PackageType

Methods

rnf :: PackageType -> () #

NFData ProvisionedConcurrencyConfigListItem 
Instance details

Defined in Amazonka.Lambda.Types.ProvisionedConcurrencyConfigListItem

NFData ProvisionedConcurrencyStatusEnum 
Instance details

Defined in Amazonka.Lambda.Types.ProvisionedConcurrencyStatusEnum

NFData Runtime 
Instance details

Defined in Amazonka.Lambda.Types.Runtime

Methods

rnf :: Runtime -> () #

NFData SelfManagedEventSource 
Instance details

Defined in Amazonka.Lambda.Types.SelfManagedEventSource

Methods

rnf :: SelfManagedEventSource -> () #

NFData SelfManagedKafkaEventSourceConfig 
Instance details

Defined in Amazonka.Lambda.Types.SelfManagedKafkaEventSourceConfig

NFData SnapStart 
Instance details

Defined in Amazonka.Lambda.Types.SnapStart

Methods

rnf :: SnapStart -> () #

NFData SnapStartApplyOn 
Instance details

Defined in Amazonka.Lambda.Types.SnapStartApplyOn

Methods

rnf :: SnapStartApplyOn -> () #

NFData SnapStartOptimizationStatus 
Instance details

Defined in Amazonka.Lambda.Types.SnapStartOptimizationStatus

NFData SnapStartResponse 
Instance details

Defined in Amazonka.Lambda.Types.SnapStartResponse

Methods

rnf :: SnapStartResponse -> () #

NFData SourceAccessConfiguration 
Instance details

Defined in Amazonka.Lambda.Types.SourceAccessConfiguration

NFData SourceAccessType 
Instance details

Defined in Amazonka.Lambda.Types.SourceAccessType

Methods

rnf :: SourceAccessType -> () #

NFData State 
Instance details

Defined in Amazonka.Lambda.Types.State

Methods

rnf :: State -> () #

NFData StateReasonCode 
Instance details

Defined in Amazonka.Lambda.Types.StateReasonCode

Methods

rnf :: StateReasonCode -> () #

NFData TracingConfig 
Instance details

Defined in Amazonka.Lambda.Types.TracingConfig

Methods

rnf :: TracingConfig -> () #

NFData TracingConfigResponse 
Instance details

Defined in Amazonka.Lambda.Types.TracingConfigResponse

Methods

rnf :: TracingConfigResponse -> () #

NFData TracingMode 
Instance details

Defined in Amazonka.Lambda.Types.TracingMode

Methods

rnf :: TracingMode -> () #

NFData VpcConfig 
Instance details

Defined in Amazonka.Lambda.Types.VpcConfig

Methods

rnf :: VpcConfig -> () #

NFData VpcConfigResponse 
Instance details

Defined in Amazonka.Lambda.Types.VpcConfigResponse

Methods

rnf :: VpcConfigResponse -> () #

NFData GetRoleCredentials 
Instance details

Defined in Amazonka.SSO.GetRoleCredentials

Methods

rnf :: GetRoleCredentials -> () #

NFData GetRoleCredentialsResponse 
Instance details

Defined in Amazonka.SSO.GetRoleCredentials

NFData ListAccountRoles 
Instance details

Defined in Amazonka.SSO.ListAccountRoles

Methods

rnf :: ListAccountRoles -> () #

NFData ListAccountRolesResponse 
Instance details

Defined in Amazonka.SSO.ListAccountRoles

NFData ListAccounts 
Instance details

Defined in Amazonka.SSO.ListAccounts

Methods

rnf :: ListAccounts -> () #

NFData ListAccountsResponse 
Instance details

Defined in Amazonka.SSO.ListAccounts

Methods

rnf :: ListAccountsResponse -> () #

NFData Logout 
Instance details

Defined in Amazonka.SSO.Logout

Methods

rnf :: Logout -> () #

NFData LogoutResponse 
Instance details

Defined in Amazonka.SSO.Logout

Methods

rnf :: LogoutResponse -> () #

NFData AccountInfo 
Instance details

Defined in Amazonka.SSO.Types.AccountInfo

Methods

rnf :: AccountInfo -> () #

NFData RoleCredentials 
Instance details

Defined in Amazonka.SSO.Types.RoleCredentials

Methods

rnf :: RoleCredentials -> () #

NFData RoleInfo 
Instance details

Defined in Amazonka.SSO.Types.RoleInfo

Methods

rnf :: RoleInfo -> () #

NFData AssumeRole 
Instance details

Defined in Amazonka.STS.AssumeRole

Methods

rnf :: AssumeRole -> () #

NFData AssumeRoleResponse 
Instance details

Defined in Amazonka.STS.AssumeRole

Methods

rnf :: AssumeRoleResponse -> () #

NFData AssumeRoleWithSAML 
Instance details

Defined in Amazonka.STS.AssumeRoleWithSAML

Methods

rnf :: AssumeRoleWithSAML -> () #

NFData AssumeRoleWithSAMLResponse 
Instance details

Defined in Amazonka.STS.AssumeRoleWithSAML

NFData AssumeRoleWithWebIdentity 
Instance details

Defined in Amazonka.STS.AssumeRoleWithWebIdentity

NFData AssumeRoleWithWebIdentityResponse 
Instance details

Defined in Amazonka.STS.AssumeRoleWithWebIdentity

NFData DecodeAuthorizationMessage 
Instance details

Defined in Amazonka.STS.DecodeAuthorizationMessage

NFData DecodeAuthorizationMessageResponse 
Instance details

Defined in Amazonka.STS.DecodeAuthorizationMessage

NFData GetAccessKeyInfo 
Instance details

Defined in Amazonka.STS.GetAccessKeyInfo

Methods

rnf :: GetAccessKeyInfo -> () #

NFData GetAccessKeyInfoResponse 
Instance details

Defined in Amazonka.STS.GetAccessKeyInfo

NFData GetCallerIdentity 
Instance details

Defined in Amazonka.STS.GetCallerIdentity

Methods

rnf :: GetCallerIdentity -> () #

NFData GetCallerIdentityResponse 
Instance details

Defined in Amazonka.STS.GetCallerIdentity

NFData GetFederationToken 
Instance details

Defined in Amazonka.STS.GetFederationToken

Methods

rnf :: GetFederationToken -> () #

NFData GetFederationTokenResponse 
Instance details

Defined in Amazonka.STS.GetFederationToken

NFData GetSessionToken 
Instance details

Defined in Amazonka.STS.GetSessionToken

Methods

rnf :: GetSessionToken -> () #

NFData GetSessionTokenResponse 
Instance details

Defined in Amazonka.STS.GetSessionToken

Methods

rnf :: GetSessionTokenResponse -> () #

NFData AssumedRoleUser 
Instance details

Defined in Amazonka.STS.Types.AssumedRoleUser

Methods

rnf :: AssumedRoleUser -> () #

NFData FederatedUser 
Instance details

Defined in Amazonka.STS.Types.FederatedUser

Methods

rnf :: FederatedUser -> () #

NFData PolicyDescriptorType 
Instance details

Defined in Amazonka.STS.Types.PolicyDescriptorType

Methods

rnf :: PolicyDescriptorType -> () #

NFData Tag 
Instance details

Defined in Amazonka.STS.Types.Tag

Methods

rnf :: Tag -> () #

NFData All

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: All -> () #

NFData Any

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Any -> () #

NFData TypeRep

NOTE: Prior to deepseq-1.4.4.0 this instance was only defined for base-4.8.0.0 and later.

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: TypeRep -> () #

NFData Unique

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Unique -> () #

NFData Version

Since: deepseq-1.3.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Version -> () #

NFData Void

Defined as rnf = absurd.

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Void -> () #

NFData CBool

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CBool -> () #

NFData CChar

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CChar -> () #

NFData CClock

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CClock -> () #

NFData CDouble

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CDouble -> () #

NFData CFile

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CFile -> () #

NFData CFloat

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CFloat -> () #

NFData CFpos

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CFpos -> () #

NFData CInt

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CInt -> () #

NFData CIntMax

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CIntMax -> () #

NFData CIntPtr

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CIntPtr -> () #

NFData CJmpBuf

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CJmpBuf -> () #

NFData CLLong

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CLLong -> () #

NFData CLong

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CLong -> () #

NFData CPtrdiff

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CPtrdiff -> () #

NFData CSChar

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CSChar -> () #

NFData CSUSeconds

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CSUSeconds -> () #

NFData CShort

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CShort -> () #

NFData CSigAtomic

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CSigAtomic -> () #

NFData CSize

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CSize -> () #

NFData CTime

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CTime -> () #

NFData CUChar

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CUChar -> () #

NFData CUInt

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CUInt -> () #

NFData CUIntMax

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CUIntMax -> () #

NFData CUIntPtr

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CUIntPtr -> () #

NFData CULLong

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CULLong -> () #

NFData CULong

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CULong -> () #

NFData CUSeconds

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CUSeconds -> () #

NFData CUShort

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CUShort -> () #

NFData CWchar

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CWchar -> () #

NFData ThreadId

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: ThreadId -> () #

NFData Fingerprint

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Fingerprint -> () #

NFData MaskingState

Since: deepseq-1.4.4.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: MaskingState -> () #

NFData ExitCode

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: ExitCode -> () #

NFData Int16 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int16 -> () #

NFData Int32 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int32 -> () #

NFData Int64 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int64 -> () #

NFData Int8 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int8 -> () #

NFData CallStack

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CallStack -> () #

NFData SrcLoc

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: SrcLoc -> () #

NFData Word16 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word16 -> () #

NFData Word32 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word32 -> () #

NFData Word64 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word64 -> () #

NFData Word8 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word8 -> () #

NFData ByteString 
Instance details

Defined in Data.ByteString.Internal

Methods

rnf :: ByteString -> () #

NFData ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Methods

rnf :: ByteString -> () #

NFData ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Methods

rnf :: ShortByteString -> () #

NFData IntSet 
Instance details

Defined in Data.IntSet.Internal

Methods

rnf :: IntSet -> () #

NFData SharedSecret 
Instance details

Defined in Crypto.ECC

Methods

rnf :: SharedSecret -> () #

NFData ByteArray 
Instance details

Defined in Data.Array.Byte

Methods

rnf :: ByteArray -> () #

NFData Ordering 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Ordering -> () #

NFData TyCon

NOTE: Prior to deepseq-1.4.4.0 this instance was only defined for base-4.8.0.0 and later.

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: TyCon -> () #

NFData URI 
Instance details

Defined in Network.URI

Methods

rnf :: URI -> () #

NFData URIAuth 
Instance details

Defined in Network.URI

Methods

rnf :: URIAuth -> () #

NFData TextDetails 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

rnf :: TextDetails -> () #

NFData Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Methods

rnf :: Doc -> () #

NFData StdGen 
Instance details

Defined in System.Random.Internal

Methods

rnf :: StdGen -> () #

NFData Scientific 
Instance details

Defined in Data.Scientific

Methods

rnf :: Scientific -> () #

NFData UnicodeException 
Instance details

Defined in Data.Text.Encoding.Error

Methods

rnf :: UnicodeException -> () #

NFData ShortText 
Instance details

Defined in Data.Text.Short.Internal

Methods

rnf :: ShortText -> () #

NFData Day 
Instance details

Defined in Data.Time.Calendar.Days

Methods

rnf :: Day -> () #

NFData AbsoluteTime 
Instance details

Defined in Data.Time.Clock.Internal.AbsoluteTime

Methods

rnf :: AbsoluteTime -> () #

NFData DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Methods

rnf :: DiffTime -> () #

NFData UTCTime 
Instance details

Defined in Data.Time.Clock.Internal.UTCTime

Methods

rnf :: UTCTime -> () #

NFData UniversalTime 
Instance details

Defined in Data.Time.Clock.Internal.UniversalTime

Methods

rnf :: UniversalTime -> () #

NFData LocalTime 
Instance details

Defined in Data.Time.LocalTime.Internal.LocalTime

Methods

rnf :: LocalTime -> () #

NFData ZonedTime 
Instance details

Defined in Data.Time.LocalTime.Internal.ZonedTime

Methods

rnf :: ZonedTime -> () #

NFData UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

rnf :: UUID -> () #

NFData Content 
Instance details

Defined in Data.XML.Types

Methods

rnf :: Content -> () #

NFData Doctype 
Instance details

Defined in Data.XML.Types

Methods

rnf :: Doctype -> () #

NFData Document 
Instance details

Defined in Data.XML.Types

Methods

rnf :: Document -> () #

NFData Element 
Instance details

Defined in Data.XML.Types

Methods

rnf :: Element -> () #

NFData Event 
Instance details

Defined in Data.XML.Types

Methods

rnf :: Event -> () #

NFData ExternalID 
Instance details

Defined in Data.XML.Types

Methods

rnf :: ExternalID -> () #

NFData Instruction 
Instance details

Defined in Data.XML.Types

Methods

rnf :: Instruction -> () #

NFData Miscellaneous 
Instance details

Defined in Data.XML.Types

Methods

rnf :: Miscellaneous -> () #

NFData Name 
Instance details

Defined in Data.XML.Types

Methods

rnf :: Name -> () #

NFData Node 
Instance details

Defined in Data.XML.Types

Methods

rnf :: Node -> () #

NFData Prologue 
Instance details

Defined in Data.XML.Types

Methods

rnf :: Prologue -> () #

NFData Integer 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Integer -> () #

NFData Natural

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Natural -> () #

NFData () 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: () -> () #

NFData Bool 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Bool -> () #

NFData Char 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Char -> () #

NFData Double 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Double -> () #

NFData Float 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Float -> () #

NFData Int 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int -> () #

NFData Word 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word -> () #

NFData v => NFData (KeyMap v) 
Instance details

Defined in Data.Aeson.KeyMap

Methods

rnf :: KeyMap v -> () #

NFData a => NFData (IResult a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

rnf :: IResult a -> () #

NFData a => NFData (Result a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

rnf :: Result a -> () #

NFData a => NFData (Sensitive a) 
Instance details

Defined in Amazonka.Data.Sensitive

Methods

rnf :: Sensitive a -> () #

NFData (Time a) 
Instance details

Defined in Amazonka.Data.Time

Methods

rnf :: Time a -> () #

NFData a => NFData (ZipList a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: ZipList a -> () #

NFData a => NFData (Complex a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Complex a -> () #

NFData a => NFData (Identity a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Identity a -> () #

NFData a => NFData (First a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: First a -> () #

NFData a => NFData (Last a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Last a -> () #

NFData a => NFData (Down a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Down a -> () #

NFData a => NFData (First a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: First a -> () #

NFData a => NFData (Last a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Last a -> () #

NFData a => NFData (Max a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Max a -> () #

NFData a => NFData (Min a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Min a -> () #

NFData m => NFData (WrappedMonoid m)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: WrappedMonoid m -> () #

NFData a => NFData (Dual a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Dual a -> () #

NFData a => NFData (Product a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Product a -> () #

NFData a => NFData (Sum a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Sum a -> () #

NFData (IORef a)

NOTE: Only strict in the reference and not the referenced value.

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: IORef a -> () #

NFData (MVar a)

NOTE: Only strict in the reference and not the referenced value.

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: MVar a -> () #

NFData (FunPtr a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: FunPtr a -> () #

NFData (Ptr a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Ptr a -> () #

NFData a => NFData (Ratio a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Ratio a -> () #

NFData (StableName a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: StableName a -> () #

NFData a => NFData (SCC a) 
Instance details

Defined in Data.Graph

Methods

rnf :: SCC a -> () #

NFData a => NFData (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

rnf :: IntMap a -> () #

NFData a => NFData (Digit a) 
Instance details

Defined in Data.Sequence.Internal

Methods

rnf :: Digit a -> () #

NFData a => NFData (Elem a) 
Instance details

Defined in Data.Sequence.Internal

Methods

rnf :: Elem a -> () #

NFData a => NFData (FingerTree a) 
Instance details

Defined in Data.Sequence.Internal

Methods

rnf :: FingerTree a -> () #

NFData a => NFData (Node a) 
Instance details

Defined in Data.Sequence.Internal

Methods

rnf :: Node a -> () #

NFData a => NFData (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

rnf :: Seq a -> () #

NFData a => NFData (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

rnf :: Set a -> () #

NFData a => NFData (Tree a) 
Instance details

Defined in Data.Tree

Methods

rnf :: Tree a -> () #

NFData (Context a) 
Instance details

Defined in Crypto.Hash.Types

Methods

rnf :: Context a -> () #

NFData (Digest a) 
Instance details

Defined in Crypto.Hash.Types

Methods

rnf :: Digest a -> () #

NFData (MutableByteArray s) 
Instance details

Defined in Data.Array.Byte

Methods

rnf :: MutableByteArray s -> () #

NFData1 f => NFData (Fix f) 
Instance details

Defined in Data.Fix

Methods

rnf :: Fix f -> () #

NFData a => NFData (DNonEmpty a) 
Instance details

Defined in Data.DList.DNonEmpty.Internal

Methods

rnf :: DNonEmpty a -> () #

NFData a => NFData (DList a) 
Instance details

Defined in Data.DList.Internal

Methods

rnf :: DList a -> () #

NFData a => NFData (Hashed a) 
Instance details

Defined in Data.Hashable.Class

Methods

rnf :: Hashed a -> () #

NFData a => NFData (AnnotDetails a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

rnf :: AnnotDetails a -> () #

NFData a => NFData (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

rnf :: Doc a -> () #

NFData a => NFData (Array a) 
Instance details

Defined in Data.Primitive.Array

Methods

rnf :: Array a -> () #

NFData (PrimArray a) 
Instance details

Defined in Data.Primitive.PrimArray

Methods

rnf :: PrimArray a -> () #

NFData a => NFData (SmallArray a) 
Instance details

Defined in Data.Primitive.SmallArray

Methods

rnf :: SmallArray a -> () #

NFData g => NFData (StateGen g) 
Instance details

Defined in System.Random.Internal

Methods

rnf :: StateGen g -> () #

NFData g => NFData (AtomicGen g) 
Instance details

Defined in System.Random.Stateful

Methods

rnf :: AtomicGen g -> () #

NFData g => NFData (IOGen g) 
Instance details

Defined in System.Random.Stateful

Methods

rnf :: IOGen g -> () #

NFData g => NFData (STGen g) 
Instance details

Defined in System.Random.Stateful

Methods

rnf :: STGen g -> () #

NFData g => NFData (TGen g) 
Instance details

Defined in System.Random.Stateful

Methods

rnf :: TGen g -> () #

NFData a => NFData (Maybe a) 
Instance details

Defined in Data.Strict.Maybe

Methods

rnf :: Maybe a -> () #

NFData a => NFData (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Methods

rnf :: HashSet a -> () #

NFData a => NFData (Vector a) 
Instance details

Defined in Data.Vector

Methods

rnf :: Vector a -> () #

NFData (Vector a) 
Instance details

Defined in Data.Vector.Primitive

Methods

rnf :: Vector a -> () #

NFData (Vector a) 
Instance details

Defined in Data.Vector.Storable

Methods

rnf :: Vector a -> () #

NFData (Vector a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

rnf :: Vector a -> () #

NFData a => NFData (NonEmpty a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: NonEmpty a -> () #

NFData a => NFData (Maybe a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Maybe a -> () #

NFData a => NFData [a] 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: [a] -> () #

(NFData i, NFData r) => NFData (IResult i r) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

rnf :: IResult i r -> () #

(NFData a, NFData b) => NFData (Either a b) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Either a b -> () #

NFData (Fixed a)

Since: deepseq-1.3.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Fixed a -> () #

NFData (Proxy a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Proxy a -> () #

(NFData a, NFData b) => NFData (Arg a b)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Arg a b -> () #

(NFData a, NFData b) => NFData (Array a b) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Array a b -> () #

NFData (STRef s a)

NOTE: Only strict in the reference and not the referenced value.

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: STRef s a -> () #

(NFData k, NFData a) => NFData (Map k a) 
Instance details

Defined in Data.Map.Internal

Methods

rnf :: Map k a -> () #

NFData (MutablePrimArray s a) 
Instance details

Defined in Data.Primitive.PrimArray

Methods

rnf :: MutablePrimArray s a -> () #

(NFData a, NFData b) => NFData (Either a b) 
Instance details

Defined in Data.Strict.Either

Methods

rnf :: Either a b -> () #

(NFData a, NFData b) => NFData (These a b) 
Instance details

Defined in Data.Strict.These

Methods

rnf :: These a b -> () #

(NFData a, NFData b) => NFData (Pair a b) 
Instance details

Defined in Data.Strict.Tuple

Methods

rnf :: Pair a b -> () #

(NFData a, NFData b) => NFData (These a b)

Since: these-0.7.1

Instance details

Defined in Data.These

Methods

rnf :: These a b -> () #

(NFData k, NFData v) => NFData (HashMap k v) 
Instance details

Defined in Data.HashMap.Internal

Methods

rnf :: HashMap k v -> () #

(NFData k, NFData v) => NFData (Leaf k v) 
Instance details

Defined in Data.HashMap.Internal

Methods

rnf :: Leaf k v -> () #

NFData (MVector s a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

rnf :: MVector s a -> () #

NFData (a -> b)

This instance is for convenience and consistency with seq. This assumes that WHNF is equivalent to NF for functions.

Since: deepseq-1.3.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a -> b) -> () #

(NFData a, NFData b) => NFData (a, b) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a, b) -> () #

NFData a => NFData (Const a b)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Const a b -> () #

NFData (a :~: b)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a :~: b) -> () #

NFData b => NFData (Tagged s b) 
Instance details

Defined in Data.Tagged

Methods

rnf :: Tagged s b -> () #

(NFData (f a), NFData (g a), NFData a) => NFData (These1 f g a)

Available always

Since: these-1.2

Instance details

Defined in Data.Functor.These

Methods

rnf :: These1 f g a -> () #

(NFData a1, NFData a2, NFData a3) => NFData (a1, a2, a3) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a1, a2, a3) -> () #

(NFData1 f, NFData1 g, NFData a) => NFData (Product f g a)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Product f g a -> () #

(NFData1 f, NFData1 g, NFData a) => NFData (Sum f g a)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Sum f g a -> () #

NFData (a :~~: b)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a :~~: b) -> () #

(NFData a1, NFData a2, NFData a3, NFData a4) => NFData (a1, a2, a3, a4) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a1, a2, a3, a4) -> () #

(NFData1 f, NFData1 g, NFData a) => NFData (Compose f g a)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Compose f g a -> () #

(NFData a1, NFData a2, NFData a3, NFData a4, NFData a5) => NFData (a1, a2, a3, a4, a5) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a1, a2, a3, a4, a5) -> () #

(NFData a1, NFData a2, NFData a3, NFData a4, NFData a5, NFData a6) => NFData (a1, a2, a3, a4, a5, a6) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a1, a2, a3, a4, a5, a6) -> () #

(NFData a1, NFData a2, NFData a3, NFData a4, NFData a5, NFData a6, NFData a7) => NFData (a1, a2, a3, a4, a5, a6, a7) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a1, a2, a3, a4, a5, a6, a7) -> () #

(NFData a1, NFData a2, NFData a3, NFData a4, NFData a5, NFData a6, NFData a7, NFData a8) => NFData (a1, a2, a3, a4, a5, a6, a7, a8) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a1, a2, a3, a4, a5, a6, a7, a8) -> () #

(NFData a1, NFData a2, NFData a3, NFData a4, NFData a5, NFData a6, NFData a7, NFData a8, NFData a9) => NFData (a1, a2, a3, a4, a5, a6, a7, a8, a9) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a1, a2, a3, a4, a5, a6, a7, a8, a9) -> () #

class MonadTrans (t :: (Type -> Type) -> Type -> Type) where #

The class of monad transformers. Instances should satisfy the following laws, which state that lift is a monad transformation:

Methods

lift :: Monad m => m a -> t m a #

Lift a computation from the argument monad to the constructed monad.

Instances

Instances details
MonadTrans Free

This is not a true monad transformer. It is only a monad transformer "up to retract".

Instance details

Defined in Control.Monad.Free

Methods

lift :: Monad m => m a -> Free m a #

MonadTrans Yoneda 
Instance details

Defined in Data.Functor.Yoneda

Methods

lift :: Monad m => m a -> Yoneda m a #

MonadTrans LoggingT 
Instance details

Defined in Control.Monad.Logger

Methods

lift :: Monad m => m a -> LoggingT m a #

MonadTrans NoLoggingT 
Instance details

Defined in Control.Monad.Logger

Methods

lift :: Monad m => m a -> NoLoggingT m a #

MonadTrans WriterLoggingT 
Instance details

Defined in Control.Monad.Logger

Methods

lift :: Monad m => m a -> WriterLoggingT m a #

MonadTrans ResourceT 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

lift :: Monad m => m a -> ResourceT m a #

MonadTrans ListT 
Instance details

Defined in Control.Monad.Trans.List

Methods

lift :: Monad m => m a -> ListT m a #

MonadTrans MaybeT 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

lift :: Monad m => m a -> MaybeT m a #

Alternative f => MonadTrans (CofreeT f) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

lift :: Monad m => m a -> CofreeT f m a #

Functor f => MonadTrans (FreeT f) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

lift :: Monad m => m a -> FreeT f m a #

Monoid w => MonadTrans (AccumT w) 
Instance details

Defined in Control.Monad.Trans.Accum

Methods

lift :: Monad m => m a -> AccumT w m a #

MonadTrans (ErrorT e) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

lift :: Monad m => m a -> ErrorT e m a #

MonadTrans (ExceptT e) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

lift :: Monad m => m a -> ExceptT e m a #

MonadTrans (IdentityT :: (Type -> Type) -> Type -> Type) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

lift :: Monad m => m a -> IdentityT m a #

MonadTrans (ReaderT r) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

lift :: Monad m => m a -> ReaderT r m a #

MonadTrans (SelectT r) 
Instance details

Defined in Control.Monad.Trans.Select

Methods

lift :: Monad m => m a -> SelectT r m a #

MonadTrans (StateT s) 
Instance details

Defined in Control.Monad.Trans.State.Lazy

Methods

lift :: Monad m => m a -> StateT s m a #

MonadTrans (StateT s) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

lift :: Monad m => m a -> StateT s m a #

Monoid w => MonadTrans (WriterT w) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

lift :: Monad m => m a -> WriterT w m a #

Monoid w => MonadTrans (WriterT w) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

lift :: Monad m => m a -> WriterT w m a #

MonadTrans (ConduitT i o) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

lift :: Monad m => m a -> ConduitT i o m a #

MonadTrans (ContT r) 
Instance details

Defined in Control.Monad.Trans.Cont

Methods

lift :: Monad m => m a -> ContT r m a #

Monoid w => MonadTrans (RWST r w s) 
Instance details

Defined in Control.Monad.Trans.RWS.Lazy

Methods

lift :: Monad m => m a -> RWST r w s m a #

Monoid w => MonadTrans (RWST r w s) 
Instance details

Defined in Control.Monad.Trans.RWS.Strict

Methods

lift :: Monad m => m a -> RWST r w s m a #

MonadTrans (Pipe l i o u) 
Instance details

Defined in Data.Conduit.Internal.Pipe

Methods

lift :: Monad m => m a -> Pipe l i o u m a #

(||) :: Bool -> Bool -> Bool infixr 2 #

Boolean "or", lazy in the second argument

not :: Bool -> Bool #

Boolean "not"

(&&) :: Bool -> Bool -> Bool infixr 3 #

Boolean "and", lazy in the second argument

data SomeException #

The SomeException type is the root of the exception type hierarchy. When an exception of type e is thrown, behind the scenes it is encapsulated in a SomeException.

Constructors

Exception e => SomeException e 

undefined :: forall (r :: RuntimeRep) (a :: TYPE r). HasCallStack => a #

A special case of error. It is expected that compilers will recognize this and insert error messages which are more appropriate to the context in which undefined appears.

($!) :: forall (r :: RuntimeRep) a (b :: TYPE r). (a -> b) -> a -> b infixr 0 #

Strict (call-by-value) application operator. It takes a function and an argument, evaluates the argument to weak head normal form (WHNF), then calls the function with that value.

(=<<) :: Monad m => (a -> m b) -> m a -> m b infixr 1 #

Same as >>=, but with the arguments interchanged.

asTypeOf :: a -> a -> a #

asTypeOf is a type-restricted version of const. It is usually used as an infix operator, and its typing forces its first argument (which is usually overloaded) to have the same type as the second.

flip :: (a -> b -> c) -> b -> a -> c #

flip f takes its (first) two arguments in the reverse order of f.

>>> flip (++) "hello" "world"
"worldhello"

liftM2 :: Monad m => (a1 -> a2 -> r) -> m a1 -> m a2 -> m r #

Promote a function to a monad, scanning the monadic arguments from left to right. For example,

liftM2 (+) [0,1] [0,2] = [0,2,1,3]
liftM2 (+) (Just 1) Nothing = Nothing

when :: Applicative f => Bool -> f () -> f () #

Conditional execution of Applicative expressions. For example,

when debug (putStrLn "Debugging")

will output the string Debugging if the Boolean value debug is True, and otherwise do nothing.

subtract :: Num a => a -> a -> a #

the same as flip (-).

Because - is treated specially in the Haskell grammar, (- e) is not a section, but an application of prefix negation. However, (subtract exp) is equivalent to the disallowed section.

curry :: ((a, b) -> c) -> a -> b -> c #

curry converts an uncurried function to a curried function.

Examples

Expand
>>> curry fst 1 2
1

uncurry :: (a -> b -> c) -> (a, b) -> c #

uncurry converts a curried function to a function on pairs.

Examples

Expand
>>> uncurry (+) (1,2)
3
>>> uncurry ($) (show, 1)
"1"
>>> map (uncurry max) [(1,2), (3,4), (6,8)]
[2,4,8]

(<&>) :: Functor f => f a -> (a -> b) -> f b infixl 1 #

Flipped version of <$>.

(<&>) = flip fmap

Examples

Expand

Apply (+1) to a list, a Just and a Right:

>>> Just 2 <&> (+1)
Just 3
>>> [1,2,3] <&> (+1)
[2,3,4]
>>> Right 3 <&> (+1)
Right 4

Since: base-4.11.0.0

void :: Functor f => f a -> f () #

void value discards or ignores the result of evaluation, such as the return value of an IO action.

Examples

Expand

Replace the contents of a Maybe Int with unit:

>>> void Nothing
Nothing
>>> void (Just 3)
Just ()

Replace the contents of an Either Int Int with unit, resulting in an Either Int ():

>>> void (Left 8675309)
Left 8675309
>>> void (Right 8675309)
Right ()

Replace every element of a list with unit:

>>> void [1,2,3]
[(),(),()]

Replace the second element of a pair with unit:

>>> void (1,2)
(1,())

Discard the result of an IO action:

>>> mapM print [1,2]
1
2
[(),()]
>>> void $ mapM print [1,2]
1
2

(&) :: a -> (a -> b) -> b infixl 1 #

& is a reverse application operator. This provides notational convenience. Its precedence is one higher than that of the forward application operator $, which allows & to be nested in $.

>>> 5 & (+1) & show
"6"

Since: base-4.8.0.0

catMaybes :: [Maybe a] -> [a] #

The catMaybes function takes a list of Maybes and returns a list of all the Just values.

Examples

Expand

Basic usage:

>>> catMaybes [Just 1, Nothing, Just 3]
[1,3]

When constructing a list of Maybe values, catMaybes can be used to return all of the "success" results (if the list is the result of a map, then mapMaybe would be more appropriate):

>>> import Text.Read ( readMaybe )
>>> [readMaybe x :: Maybe Int | x <- ["1", "Foo", "3"] ]
[Just 1,Nothing,Just 3]
>>> catMaybes $ [readMaybe x :: Maybe Int | x <- ["1", "Foo", "3"] ]
[1,3]

fromMaybe :: a -> Maybe a -> a #

The fromMaybe function takes a default value and a Maybe value. If the Maybe is Nothing, it returns the default value; otherwise, it returns the value contained in the Maybe.

Examples

Expand

Basic usage:

>>> fromMaybe "" (Just "Hello, World!")
"Hello, World!"
>>> fromMaybe "" Nothing
""

Read an integer from a string using readMaybe. If we fail to parse an integer, we want to return 0 by default:

>>> import Text.Read ( readMaybe )
>>> fromMaybe 0 (readMaybe "5")
5
>>> fromMaybe 0 (readMaybe "")
0

isJust :: Maybe a -> Bool #

The isJust function returns True iff its argument is of the form Just _.

Examples

Expand

Basic usage:

>>> isJust (Just 3)
True
>>> isJust (Just ())
True
>>> isJust Nothing
False

Only the outer constructor is taken into consideration:

>>> isJust (Just Nothing)
True

isNothing :: Maybe a -> Bool #

The isNothing function returns True iff its argument is Nothing.

Examples

Expand

Basic usage:

>>> isNothing (Just 3)
False
>>> isNothing (Just ())
False
>>> isNothing Nothing
True

Only the outer constructor is taken into consideration:

>>> isNothing (Just Nothing)
False

listToMaybe :: [a] -> Maybe a #

The listToMaybe function returns Nothing on an empty list or Just a where a is the first element of the list.

Examples

Expand

Basic usage:

>>> listToMaybe []
Nothing
>>> listToMaybe [9]
Just 9
>>> listToMaybe [1,2,3]
Just 1

Composing maybeToList with listToMaybe should be the identity on singleton/empty lists:

>>> maybeToList $ listToMaybe [5]
[5]
>>> maybeToList $ listToMaybe []
[]

But not on lists with more than one element:

>>> maybeToList $ listToMaybe [1,2,3]
[1]

mapMaybe :: (a -> Maybe b) -> [a] -> [b] #

The mapMaybe function is a version of map which can throw out elements. In particular, the functional argument returns something of type Maybe b. If this is Nothing, no element is added on to the result list. If it is Just b, then b is included in the result list.

Examples

Expand

Using mapMaybe f x is a shortcut for catMaybes $ map f x in most cases:

>>> import Text.Read ( readMaybe )
>>> let readMaybeInt = readMaybe :: String -> Maybe Int
>>> mapMaybe readMaybeInt ["1", "Foo", "3"]
[1,3]
>>> catMaybes $ map readMaybeInt ["1", "Foo", "3"]
[1,3]

If we map the Just constructor, the entire list should be returned:

>>> mapMaybe Just [1,2,3]
[1,2,3]

maybe :: b -> (a -> b) -> Maybe a -> b #

The maybe function takes a default value, a function, and a Maybe value. If the Maybe value is Nothing, the function returns the default value. Otherwise, it applies the function to the value inside the Just and returns the result.

Examples

Expand

Basic usage:

>>> maybe False odd (Just 3)
True
>>> maybe False odd Nothing
False

Read an integer from a string using readMaybe. If we succeed, return twice the integer; that is, apply (*2) to it. If instead we fail to parse an integer, return 0 by default:

>>> import Text.Read ( readMaybe )
>>> maybe 0 (*2) (readMaybe "5")
10
>>> maybe 0 (*2) (readMaybe "")
0

Apply show to a Maybe Int. If we have Just n, we want to show the underlying Int n. But if we have Nothing, we return the empty string instead of (for example) "Nothing":

>>> maybe "" show (Just 5)
"5"
>>> maybe "" show Nothing
""

maybeToList :: Maybe a -> [a] #

The maybeToList function returns an empty list when given Nothing or a singleton list when given Just.

Examples

Expand

Basic usage:

>>> maybeToList (Just 7)
[7]
>>> maybeToList Nothing
[]

One can use maybeToList to avoid pattern matching when combined with a function that (safely) works on lists:

>>> import Text.Read ( readMaybe )
>>> sum $ maybeToList (readMaybe "3")
3
>>> sum $ maybeToList (readMaybe "")
0

break :: (a -> Bool) -> [a] -> ([a], [a]) #

break, applied to a predicate p and a list xs, returns a tuple where first element is longest prefix (possibly empty) of xs of elements that do not satisfy p and second element is the remainder of the list:

>>> break (> 3) [1,2,3,4,1,2,3,4]
([1,2,3],[4,1,2,3,4])
>>> break (< 9) [1,2,3]
([],[1,2,3])
>>> break (> 9) [1,2,3]
([1,2,3],[])

break p is equivalent to span (not . p).

drop :: Int -> [a] -> [a] #

drop n xs returns the suffix of xs after the first n elements, or [] if n >= length xs.

>>> drop 6 "Hello World!"
"World!"
>>> drop 3 [1,2,3,4,5]
[4,5]
>>> drop 3 [1,2]
[]
>>> drop 3 []
[]
>>> drop (-1) [1,2]
[1,2]
>>> drop 0 [1,2]
[1,2]

It is an instance of the more general genericDrop, in which n may be of any integral type.

dropWhile :: (a -> Bool) -> [a] -> [a] #

dropWhile p xs returns the suffix remaining after takeWhile p xs.

>>> dropWhile (< 3) [1,2,3,4,5,1,2,3]
[3,4,5,1,2,3]
>>> dropWhile (< 9) [1,2,3]
[]
>>> dropWhile (< 0) [1,2,3]
[1,2,3]

lookup :: Eq a => a -> [(a, b)] -> Maybe b #

\(\mathcal{O}(n)\). lookup key assocs looks up a key in an association list.

>>> lookup 2 []
Nothing
>>> lookup 2 [(1, "first")]
Nothing
>>> lookup 2 [(1, "first"), (2, "second"), (3, "third")]
Just "second"

replicate :: Int -> a -> [a] #

replicate n x is a list of length n with x the value of every element. It is an instance of the more general genericReplicate, in which n may be of any integral type.

>>> replicate 0 True
[]
>>> replicate (-1) True
[]
>>> replicate 4 True
[True,True,True,True]

reverse :: [a] -> [a] #

reverse xs returns the elements of xs in reverse order. xs must be finite.

>>> reverse []
[]
>>> reverse [42]
[42]
>>> reverse [2,5,7]
[7,5,2]
>>> reverse [1..]
* Hangs forever *

take :: Int -> [a] -> [a] #

take n, applied to a list xs, returns the prefix of xs of length n, or xs itself if n >= length xs.

>>> take 5 "Hello World!"
"Hello"
>>> take 3 [1,2,3,4,5]
[1,2,3]
>>> take 3 [1,2]
[1,2]
>>> take 3 []
[]
>>> take (-1) [1,2]
[]
>>> take 0 [1,2]
[]

It is an instance of the more general genericTake, in which n may be of any integral type.

takeWhile :: (a -> Bool) -> [a] -> [a] #

takeWhile, applied to a predicate p and a list xs, returns the longest prefix (possibly empty) of xs of elements that satisfy p.

>>> takeWhile (< 3) [1,2,3,4,1,2,3,4]
[1,2]
>>> takeWhile (< 9) [1,2,3]
[1,2,3]
>>> takeWhile (< 0) [1,2,3]
[]

zipWith :: (a -> b -> c) -> [a] -> [b] -> [c] #

\(\mathcal{O}(\min(m,n))\). zipWith generalises zip by zipping with the function given as the first argument, instead of a tupling function.

zipWith (,) xs ys == zip xs ys
zipWith f [x1,x2,x3..] [y1,y2,y3..] == [f x1 y1, f x2 y2, f x3 y3..]

For example, zipWith (+) is applied to two lists to produce the list of corresponding sums:

>>> zipWith (+) [1, 2, 3] [4, 5, 6]
[5,7,9]

zipWith is right-lazy:

>>> let f = undefined
>>> zipWith f [] undefined
[]

zipWith is capable of list fusion, but it is restricted to its first list argument and its resulting list.

(^) :: (Num a, Integral b) => a -> b -> a infixr 8 #

raise a number to a non-negative integral power

(^^) :: (Fractional a, Integral b) => a -> b -> a infixr 8 #

raise a number to an integral power

even :: Integral a => a -> Bool #

gcd :: Integral a => a -> a -> a #

gcd x y is the non-negative factor of both x and y of which every common factor of x and y is also a factor; for example gcd 4 2 = 2, gcd (-4) 6 = 2, gcd 0 4 = 4. gcd 0 0 = 0. (That is, the common divisor that is "greatest" in the divisibility preordering.)

Note: Since for signed fixed-width integer types, abs minBound < 0, the result may be negative if one of the arguments is minBound (and necessarily is if the other is 0 or minBound) for such types.

lcm :: Integral a => a -> a -> a #

lcm x y is the smallest positive integer that both x and y divide.

odd :: Integral a => a -> Bool #

data Proxy (t :: k) #

Proxy is a type that holds no data, but has a phantom parameter of arbitrary type (or even kind). Its use is to provide type information, even though there is no value available of that type (or it may be too costly to create one).

Historically, Proxy :: Proxy a is a safer alternative to the undefined :: a idiom.

>>> Proxy :: Proxy (Void, Int -> Int)
Proxy

Proxy can even hold types of higher kinds,

>>> Proxy :: Proxy Either
Proxy
>>> Proxy :: Proxy Functor
Proxy
>>> Proxy :: Proxy complicatedStructure
Proxy

Constructors

Proxy 

Instances

Instances details
Generic1 (Proxy :: k -> Type) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 Proxy :: k -> Type #

Methods

from1 :: forall (a :: k0). Proxy a -> Rep1 Proxy a #

to1 :: forall (a :: k0). Rep1 Proxy a -> Proxy a #

Representable (Proxy :: Type -> Type) 
Instance details

Defined in Data.Functor.Rep

Associated Types

type Rep Proxy #

Methods

tabulate :: (Rep Proxy -> a) -> Proxy a #

index :: Proxy a -> Rep Proxy -> a #

FromJSON1 (Proxy :: Type -> Type) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (Proxy a) #

liftParseJSONList :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [Proxy a] #

ToJSON1 (Proxy :: TYPE LiftedRep -> Type) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Value) -> ([a] -> Value) -> Proxy a -> Value #

liftToJSONList :: (a -> Value) -> ([a] -> Value) -> [Proxy a] -> Value #

liftToEncoding :: (a -> Encoding) -> ([a] -> Encoding) -> Proxy a -> Encoding #

liftToEncodingList :: (a -> Encoding) -> ([a] -> Encoding) -> [Proxy a] -> Encoding #

Foldable (Proxy :: TYPE LiftedRep -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Proxy m -> m #

foldMap :: Monoid m => (a -> m) -> Proxy a -> m #

foldMap' :: Monoid m => (a -> m) -> Proxy a -> m #

foldr :: (a -> b -> b) -> b -> Proxy a -> b #

foldr' :: (a -> b -> b) -> b -> Proxy a -> b #

foldl :: (b -> a -> b) -> b -> Proxy a -> b #

foldl' :: (b -> a -> b) -> b -> Proxy a -> b #

foldr1 :: (a -> a -> a) -> Proxy a -> a #

foldl1 :: (a -> a -> a) -> Proxy a -> a #

toList :: Proxy a -> [a] #

null :: Proxy a -> Bool #

length :: Proxy a -> Int #

elem :: Eq a => a -> Proxy a -> Bool #

maximum :: Ord a => Proxy a -> a #

minimum :: Ord a => Proxy a -> a #

sum :: Num a => Proxy a -> a #

product :: Num a => Proxy a -> a #

Eq1 (Proxy :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftEq :: (a -> b -> Bool) -> Proxy a -> Proxy b -> Bool #

Ord1 (Proxy :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftCompare :: (a -> b -> Ordering) -> Proxy a -> Proxy b -> Ordering #

Read1 (Proxy :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (Proxy a) #

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [Proxy a] #

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (Proxy a) #

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [Proxy a] #

Show1 (Proxy :: TYPE LiftedRep -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Proxy a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Proxy a] -> ShowS #

Contravariant (Proxy :: Type -> Type) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap :: (a' -> a) -> Proxy a -> Proxy a' #

(>$) :: b -> Proxy b -> Proxy a #

Traversable (Proxy :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Proxy a -> f (Proxy b) #

sequenceA :: Applicative f => Proxy (f a) -> f (Proxy a) #

mapM :: Monad m => (a -> m b) -> Proxy a -> m (Proxy b) #

sequence :: Monad m => Proxy (m a) -> m (Proxy a) #

Alternative (Proxy :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Proxy

Methods

empty :: Proxy a #

(<|>) :: Proxy a -> Proxy a -> Proxy a #

some :: Proxy a -> Proxy [a] #

many :: Proxy a -> Proxy [a] #

Applicative (Proxy :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

pure :: a -> Proxy a #

(<*>) :: Proxy (a -> b) -> Proxy a -> Proxy b #

liftA2 :: (a -> b -> c) -> Proxy a -> Proxy b -> Proxy c #

(*>) :: Proxy a -> Proxy b -> Proxy b #

(<*) :: Proxy a -> Proxy b -> Proxy a #

Functor (Proxy :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

fmap :: (a -> b) -> Proxy a -> Proxy b #

(<$) :: a -> Proxy b -> Proxy a #

Monad (Proxy :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

(>>=) :: Proxy a -> (a -> Proxy b) -> Proxy b #

(>>) :: Proxy a -> Proxy b -> Proxy b #

return :: a -> Proxy a #

MonadPlus (Proxy :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Proxy

Methods

mzero :: Proxy a #

mplus :: Proxy a -> Proxy a -> Proxy a #

NFData1 (Proxy :: TYPE LiftedRep -> Type)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> Proxy a -> () #

Hashable1 (Proxy :: Type -> Type) 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> Proxy a -> Int #

FromJSON (Proxy a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON (Proxy a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Data t => Data (Proxy t)

Since: base-4.7.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Proxy t -> c (Proxy t) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Proxy t) #

toConstr :: Proxy t -> Constr #

dataTypeOf :: Proxy t -> DataType #

dataCast1 :: Typeable t0 => (forall d. Data d => c (t0 d)) -> Maybe (c (Proxy t)) #

dataCast2 :: Typeable t0 => (forall d e. (Data d, Data e) => c (t0 d e)) -> Maybe (c (Proxy t)) #

gmapT :: (forall b. Data b => b -> b) -> Proxy t -> Proxy t #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Proxy t -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Proxy t -> r #

gmapQ :: (forall d. Data d => d -> u) -> Proxy t -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Proxy t -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Proxy t -> m (Proxy t) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Proxy t -> m (Proxy t) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Proxy t -> m (Proxy t) #

Monoid (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

mempty :: Proxy s #

mappend :: Proxy s -> Proxy s -> Proxy s #

mconcat :: [Proxy s] -> Proxy s #

Semigroup (Proxy s)

Since: base-4.9.0.0

Instance details

Defined in Data.Proxy

Methods

(<>) :: Proxy s -> Proxy s -> Proxy s #

sconcat :: NonEmpty (Proxy s) -> Proxy s #

stimes :: Integral b => b -> Proxy s -> Proxy s #

Bounded (Proxy t)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

minBound :: Proxy t #

maxBound :: Proxy t #

Enum (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

succ :: Proxy s -> Proxy s #

pred :: Proxy s -> Proxy s #

toEnum :: Int -> Proxy s #

fromEnum :: Proxy s -> Int #

enumFrom :: Proxy s -> [Proxy s] #

enumFromThen :: Proxy s -> Proxy s -> [Proxy s] #

enumFromTo :: Proxy s -> Proxy s -> [Proxy s] #

enumFromThenTo :: Proxy s -> Proxy s -> Proxy s -> [Proxy s] #

Generic (Proxy t) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Proxy t) :: Type -> Type #

Methods

from :: Proxy t -> Rep (Proxy t) x #

to :: Rep (Proxy t) x -> Proxy t #

Ix (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

range :: (Proxy s, Proxy s) -> [Proxy s] #

index :: (Proxy s, Proxy s) -> Proxy s -> Int #

unsafeIndex :: (Proxy s, Proxy s) -> Proxy s -> Int #

inRange :: (Proxy s, Proxy s) -> Proxy s -> Bool #

rangeSize :: (Proxy s, Proxy s) -> Int #

unsafeRangeSize :: (Proxy s, Proxy s) -> Int #

Read (Proxy t)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Show (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

showsPrec :: Int -> Proxy s -> ShowS #

show :: Proxy s -> String #

showList :: [Proxy s] -> ShowS #

NFData (Proxy a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Proxy a -> () #

Eq (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

(==) :: Proxy s -> Proxy s -> Bool #

(/=) :: Proxy s -> Proxy s -> Bool #

Ord (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

compare :: Proxy s -> Proxy s -> Ordering #

(<) :: Proxy s -> Proxy s -> Bool #

(<=) :: Proxy s -> Proxy s -> Bool #

(>) :: Proxy s -> Proxy s -> Bool #

(>=) :: Proxy s -> Proxy s -> Bool #

max :: Proxy s -> Proxy s -> Proxy s #

min :: Proxy s -> Proxy s -> Proxy s #

Hashable (Proxy a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Proxy a -> Int #

hash :: Proxy a -> Int #

MonoFoldable (Proxy a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (Proxy a) -> m) -> Proxy a -> m #

ofoldr :: (Element (Proxy a) -> b -> b) -> b -> Proxy a -> b #

ofoldl' :: (a0 -> Element (Proxy a) -> a0) -> a0 -> Proxy a -> a0 #

otoList :: Proxy a -> [Element (Proxy a)] #

oall :: (Element (Proxy a) -> Bool) -> Proxy a -> Bool #

oany :: (Element (Proxy a) -> Bool) -> Proxy a -> Bool #

onull :: Proxy a -> Bool #

olength :: Proxy a -> Int #

olength64 :: Proxy a -> Int64 #

ocompareLength :: Integral i => Proxy a -> i -> Ordering #

otraverse_ :: Applicative f => (Element (Proxy a) -> f b) -> Proxy a -> f () #

ofor_ :: Applicative f => Proxy a -> (Element (Proxy a) -> f b) -> f () #

omapM_ :: Applicative m => (Element (Proxy a) -> m ()) -> Proxy a -> m () #

oforM_ :: Applicative m => Proxy a -> (Element (Proxy a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (Proxy a) -> m a0) -> a0 -> Proxy a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (Proxy a) -> m) -> Proxy a -> m #

ofoldr1Ex :: (Element (Proxy a) -> Element (Proxy a) -> Element (Proxy a)) -> Proxy a -> Element (Proxy a) #

ofoldl1Ex' :: (Element (Proxy a) -> Element (Proxy a) -> Element (Proxy a)) -> Proxy a -> Element (Proxy a) #

headEx :: Proxy a -> Element (Proxy a) #

lastEx :: Proxy a -> Element (Proxy a) #

unsafeHead :: Proxy a -> Element (Proxy a) #

unsafeLast :: Proxy a -> Element (Proxy a) #

maximumByEx :: (Element (Proxy a) -> Element (Proxy a) -> Ordering) -> Proxy a -> Element (Proxy a) #

minimumByEx :: (Element (Proxy a) -> Element (Proxy a) -> Ordering) -> Proxy a -> Element (Proxy a) #

oelem :: Element (Proxy a) -> Proxy a -> Bool #

onotElem :: Element (Proxy a) -> Proxy a -> Bool #

MonoFunctor (Proxy a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Proxy a) -> Element (Proxy a)) -> Proxy a -> Proxy a #

MonoPointed (Proxy a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Proxy a) -> Proxy a #

MonoTraversable (Proxy a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (Proxy a) -> f (Element (Proxy a))) -> Proxy a -> f (Proxy a) #

omapM :: Applicative m => (Element (Proxy a) -> m (Element (Proxy a))) -> Proxy a -> m (Proxy a) #

type Rep1 (Proxy :: k -> Type)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

type Rep1 (Proxy :: k -> Type) = D1 ('MetaData "Proxy" "Data.Proxy" "base" 'False) (C1 ('MetaCons "Proxy" 'PrefixI 'False) (U1 :: k -> Type))
type Rep (Proxy :: Type -> Type) 
Instance details

Defined in Data.Functor.Rep

type Rep (Proxy :: Type -> Type) = Void
type Rep (Proxy t)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

type Rep (Proxy t) = D1 ('MetaData "Proxy" "Data.Proxy" "base" 'False) (C1 ('MetaCons "Proxy" 'PrefixI 'False) (U1 :: Type -> Type))
type Element (Proxy a) 
Instance details

Defined in Data.MonoTraversable

type Element (Proxy a) = a

lines :: String -> [String] #

lines breaks a string up into a list of strings at newline characters. The resulting strings do not contain newlines.

Note that after splitting the string at newline characters, the last part of the string is considered a line even if it doesn't end with a newline. For example,

>>> lines ""
[]
>>> lines "\n"
[""]
>>> lines "one"
["one"]
>>> lines "one\n"
["one"]
>>> lines "one\n\n"
["one",""]
>>> lines "one\ntwo"
["one","two"]
>>> lines "one\ntwo\n"
["one","two"]

Thus lines s contains at least as many elements as newlines in s.

unlines :: [String] -> String #

unlines is an inverse operation to lines. It joins lines, after appending a terminating newline to each.

>>> unlines ["Hello", "World", "!"]
"Hello\nWorld\n!\n"

unwords :: [String] -> String #

unwords is an inverse operation to words. It joins words with separating spaces.

>>> unwords ["Lorem", "ipsum", "dolor"]
"Lorem ipsum dolor"

words :: String -> [String] #

words breaks a string up into a list of words, which were delimited by white space.

>>> words "Lorem ipsum\ndolor"
["Lorem","ipsum","dolor"]

all :: Foldable t => (a -> Bool) -> t a -> Bool #

Determines whether all elements of the structure satisfy the predicate.

Examples

Expand

Basic usage:

>>> all (> 3) []
True
>>> all (> 3) [1,2]
False
>>> all (> 3) [1,2,3,4,5]
False
>>> all (> 3) [1..]
False
>>> all (> 3) [4..]
* Hangs forever *

and :: Foldable t => t Bool -> Bool #

and returns the conjunction of a container of Bools. For the result to be True, the container must be finite; False, however, results from a False value finitely far from the left end.

Examples

Expand

Basic usage:

>>> and []
True
>>> and [True]
True
>>> and [False]
False
>>> and [True, True, False]
False
>>> and (False : repeat True) -- Infinite list [False,True,True,True,...
False
>>> and (repeat True)
* Hangs forever *

any :: Foldable t => (a -> Bool) -> t a -> Bool #

Determines whether any element of the structure satisfies the predicate.

Examples

Expand

Basic usage:

>>> any (> 3) []
False
>>> any (> 3) [1,2]
False
>>> any (> 3) [1,2,3,4,5]
True
>>> any (> 3) [1..]
True
>>> any (> 3) [0, -1..]
* Hangs forever *

concat :: Foldable t => t [a] -> [a] #

The concatenation of all the elements of a container of lists.

Examples

Expand

Basic usage:

>>> concat (Just [1, 2, 3])
[1,2,3]
>>> concat (Left 42)
[]
>>> concat [[1, 2, 3], [4, 5], [6], []]
[1,2,3,4,5,6]

concatMap :: Foldable t => (a -> [b]) -> t a -> [b] #

Map a function over all the elements of a container and concatenate the resulting lists.

Examples

Expand

Basic usage:

>>> concatMap (take 3) [[1..], [10..], [100..], [1000..]]
[1,2,3,10,11,12,100,101,102,1000,1001,1002]
>>> concatMap (take 3) (Just [1..])
[1,2,3]

msum :: (Foldable t, MonadPlus m) => t (m a) -> m a #

The sum of a collection of actions, generalizing concat.

msum is just like asum, but specialised to MonadPlus.

notElem :: (Foldable t, Eq a) => a -> t a -> Bool infix 4 #

notElem is the negation of elem.

Examples

Expand

Basic usage:

>>> 3 `notElem` []
True
>>> 3 `notElem` [1,2]
True
>>> 3 `notElem` [1,2,3,4,5]
False

For infinite structures, notElem terminates if the value exists at a finite distance from the left side of the structure:

>>> 3 `notElem` [1..]
False
>>> 3 `notElem` ([4..] ++ [3])
* Hangs forever *

or :: Foldable t => t Bool -> Bool #

or returns the disjunction of a container of Bools. For the result to be False, the container must be finite; True, however, results from a True value finitely far from the left end.

Examples

Expand

Basic usage:

>>> or []
False
>>> or [True]
True
>>> or [False]
False
>>> or [True, True, False]
True
>>> or (True : repeat False) -- Infinite list [True,False,False,False,...
True
>>> or (repeat False)
* Hangs forever *

sequence_ :: (Foldable t, Monad m) => t (m a) -> m () #

Evaluate each monadic action in the structure from left to right, and ignore the results. For a version that doesn't ignore the results see sequence.

sequence_ is just like sequenceA_, but specialised to monadic actions.

class (Typeable e, Show e) => Exception e where #

Any type that you wish to throw or catch as an exception must be an instance of the Exception class. The simplest case is a new exception type directly below the root:

data MyException = ThisException | ThatException
    deriving Show

instance Exception MyException

The default method definitions in the Exception class do what we need in this case. You can now throw and catch ThisException and ThatException as exceptions:

*Main> throw ThisException `catch` \e -> putStrLn ("Caught " ++ show (e :: MyException))
Caught ThisException

In more complicated examples, you may wish to define a whole hierarchy of exceptions:

---------------------------------------------------------------------
-- Make the root exception type for all the exceptions in a compiler

data SomeCompilerException = forall e . Exception e => SomeCompilerException e

instance Show SomeCompilerException where
    show (SomeCompilerException e) = show e

instance Exception SomeCompilerException

compilerExceptionToException :: Exception e => e -> SomeException
compilerExceptionToException = toException . SomeCompilerException

compilerExceptionFromException :: Exception e => SomeException -> Maybe e
compilerExceptionFromException x = do
    SomeCompilerException a <- fromException x
    cast a

---------------------------------------------------------------------
-- Make a subhierarchy for exceptions in the frontend of the compiler

data SomeFrontendException = forall e . Exception e => SomeFrontendException e

instance Show SomeFrontendException where
    show (SomeFrontendException e) = show e

instance Exception SomeFrontendException where
    toException = compilerExceptionToException
    fromException = compilerExceptionFromException

frontendExceptionToException :: Exception e => e -> SomeException
frontendExceptionToException = toException . SomeFrontendException

frontendExceptionFromException :: Exception e => SomeException -> Maybe e
frontendExceptionFromException x = do
    SomeFrontendException a <- fromException x
    cast a

---------------------------------------------------------------------
-- Make an exception type for a particular frontend compiler exception

data MismatchedParentheses = MismatchedParentheses
    deriving Show

instance Exception MismatchedParentheses where
    toException   = frontendExceptionToException
    fromException = frontendExceptionFromException

We can now catch a MismatchedParentheses exception as MismatchedParentheses, SomeFrontendException or SomeCompilerException, but not other types, e.g. IOException:

*Main> throw MismatchedParentheses `catch` \e -> putStrLn ("Caught " ++ show (e :: MismatchedParentheses))
Caught MismatchedParentheses
*Main> throw MismatchedParentheses `catch` \e -> putStrLn ("Caught " ++ show (e :: SomeFrontendException))
Caught MismatchedParentheses
*Main> throw MismatchedParentheses `catch` \e -> putStrLn ("Caught " ++ show (e :: SomeCompilerException))
Caught MismatchedParentheses
*Main> throw MismatchedParentheses `catch` \e -> putStrLn ("Caught " ++ show (e :: IOException))
*** Exception: MismatchedParentheses

Minimal complete definition

Nothing

Methods

toException :: e -> SomeException #

fromException :: SomeException -> Maybe e #

displayException :: e -> String #

Render this exception value in a human-friendly manner.

Default implementation: show.

Since: base-4.8.0.0

Instances

Instances details
Exception AesonException 
Instance details

Defined in Data.Aeson

Exception AuthError 
Instance details

Defined in Amazonka.Auth.Exception

Exception Error 
Instance details

Defined in Amazonka.Types

Exception AsyncCancelled 
Instance details

Defined in Control.Concurrent.Async

Exception ExceptionInLinkedThread 
Instance details

Defined in Control.Concurrent.Async

Exception Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Exception ArithException

Since: base-4.0.0.0

Instance details

Defined in GHC.Exception.Type

Exception SomeException

Since: base-3.0

Instance details

Defined in GHC.Exception.Type

Exception AllocationLimitExceeded

Since: base-4.8.0.0

Instance details

Defined in GHC.IO.Exception

Exception ArrayException

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Exception AssertionFailed

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Exception AsyncException

Since: base-4.7.0.0

Instance details

Defined in GHC.IO.Exception

Exception BlockedIndefinitelyOnMVar

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Exception BlockedIndefinitelyOnSTM

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Exception CompactionFailed

Since: base-4.10.0.0

Instance details

Defined in GHC.IO.Exception

Exception Deadlock

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Exception ExitCode

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Exception FixIOException

Since: base-4.11.0.0

Instance details

Defined in GHC.IO.Exception

Exception IOException

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Exception SomeAsyncException

Since: base-4.7.0.0

Instance details

Defined in GHC.IO.Exception

Exception ASCII7_Invalid 
Instance details

Defined in Basement.String.Encoding.ASCII7

Methods

toException :: ASCII7_Invalid -> SomeException #

fromException :: SomeException -> Maybe ASCII7_Invalid #

displayException :: ASCII7_Invalid -> String #

Exception ISO_8859_1_Invalid 
Instance details

Defined in Basement.String.Encoding.ISO_8859_1

Methods

toException :: ISO_8859_1_Invalid -> SomeException #

fromException :: SomeException -> Maybe ISO_8859_1_Invalid #

displayException :: ISO_8859_1_Invalid -> String #

Exception UTF16_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF16

Methods

toException :: UTF16_Invalid -> SomeException #

fromException :: SomeException -> Maybe UTF16_Invalid #

displayException :: UTF16_Invalid -> String #

Exception UTF32_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF32

Methods

toException :: UTF32_Invalid -> SomeException #

fromException :: SomeException -> Maybe UTF32_Invalid #

displayException :: UTF32_Invalid -> String #

Exception NotFoundException 
Instance details

Defined in Context.Internal

Exception CryptoError 
Instance details

Defined in Crypto.Error.Types

Exception EncapsulatedPopperException 
Instance details

Defined in Network.HTTP.Client.Request

Methods

toException :: EncapsulatedPopperException -> SomeException #

fromException :: SomeException -> Maybe EncapsulatedPopperException #

displayException :: EncapsulatedPopperException -> String #

Exception HttpException 
Instance details

Defined in Network.HTTP.Client.Types

Exception HttpExceptionContentWrapper 
Instance details

Defined in Network.HTTP.Client.Types

Methods

toException :: HttpExceptionContentWrapper -> SomeException #

fromException :: SomeException -> Maybe HttpExceptionContentWrapper #

displayException :: HttpExceptionContentWrapper -> String #

Exception NullError 
Instance details

Defined in Data.NonNull

Methods

toException :: NullError -> SomeException #

fromException :: SomeException -> Maybe NullError #

displayException :: NullError -> String #

Exception InvalidAccess 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Exception ResourceCleanupException 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Exception ProcessException 
Instance details

Defined in RIO.Process

Exception AsyncExceptionWrapper 
Instance details

Defined in Control.Exception.Safe

Exception StringException 
Instance details

Defined in Control.Exception.Safe

Exception SyncExceptionWrapper 
Instance details

Defined in Control.Exception.Safe

Exception UnicodeException 
Instance details

Defined in Data.Text.Encoding.Error

Exception ByteStringOutputException 
Instance details

Defined in System.Process.Typed.Internal

Exception ExitCodeException 
Instance details

Defined in System.Process.Typed.Internal

Exception StringException

Since: unliftio-0.1.0.0

Instance details

Defined in UnliftIO.Exception

Exception ConcException 
Instance details

Defined in UnliftIO.Internals.Async

Exception ParseException 
Instance details

Defined in Data.Yaml.Internal

newtype Identity a #

Identity functor and monad. (a non-strict monad)

Since: base-4.8.0.0

Constructors

Identity 

Fields

Instances

Instances details
Arbitrary1 Identity 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitrary :: Gen a -> Gen (Identity a) #

liftShrink :: (a -> [a]) -> Identity a -> [Identity a] #

Representable Identity 
Instance details

Defined in Data.Functor.Rep

Associated Types

type Rep Identity #

Methods

tabulate :: (Rep Identity -> a) -> Identity a #

index :: Identity a -> Rep Identity -> a #

FromJSON1 Identity 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (Identity a) #

liftParseJSONList :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [Identity a] #

ToJSON1 Identity 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Value) -> ([a] -> Value) -> Identity a -> Value #

liftToJSONList :: (a -> Value) -> ([a] -> Value) -> [Identity a] -> Value #

liftToEncoding :: (a -> Encoding) -> ([a] -> Encoding) -> Identity a -> Encoding #

liftToEncodingList :: (a -> Encoding) -> ([a] -> Encoding) -> [Identity a] -> Encoding #

MonadFix Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

mfix :: (a -> Identity a) -> Identity a #

Foldable Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

fold :: Monoid m => Identity m -> m #

foldMap :: Monoid m => (a -> m) -> Identity a -> m #

foldMap' :: Monoid m => (a -> m) -> Identity a -> m #

foldr :: (a -> b -> b) -> b -> Identity a -> b #

foldr' :: (a -> b -> b) -> b -> Identity a -> b #

foldl :: (b -> a -> b) -> b -> Identity a -> b #

foldl' :: (b -> a -> b) -> b -> Identity a -> b #

foldr1 :: (a -> a -> a) -> Identity a -> a #

foldl1 :: (a -> a -> a) -> Identity a -> a #

toList :: Identity a -> [a] #

null :: Identity a -> Bool #

length :: Identity a -> Int #

elem :: Eq a => a -> Identity a -> Bool #

maximum :: Ord a => Identity a -> a #

minimum :: Ord a => Identity a -> a #

sum :: Num a => Identity a -> a #

product :: Num a => Identity a -> a #

Eq1 Identity

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftEq :: (a -> b -> Bool) -> Identity a -> Identity b -> Bool #

Ord1 Identity

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftCompare :: (a -> b -> Ordering) -> Identity a -> Identity b -> Ordering #

Read1 Identity

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (Identity a) #

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [Identity a] #

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (Identity a) #

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [Identity a] #

Show1 Identity

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Identity a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Identity a] -> ShowS #

Traversable Identity

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Identity a -> f (Identity b) #

sequenceA :: Applicative f => Identity (f a) -> f (Identity a) #

mapM :: Monad m => (a -> m b) -> Identity a -> m (Identity b) #

sequence :: Monad m => Identity (m a) -> m (Identity a) #

Applicative Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

pure :: a -> Identity a #

(<*>) :: Identity (a -> b) -> Identity a -> Identity b #

liftA2 :: (a -> b -> c) -> Identity a -> Identity b -> Identity c #

(*>) :: Identity a -> Identity b -> Identity b #

(<*) :: Identity a -> Identity b -> Identity a #

Functor Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

fmap :: (a -> b) -> Identity a -> Identity b #

(<$) :: a -> Identity b -> Identity a #

Monad Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

(>>=) :: Identity a -> (a -> Identity b) -> Identity b #

(>>) :: Identity a -> Identity b -> Identity b #

return :: a -> Identity a #

NFData1 Identity

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> Identity a -> () #

Hashable1 Identity 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> Identity a -> Int #

Generic1 Identity 
Instance details

Defined in Data.Functor.Identity

Associated Types

type Rep1 Identity :: k -> Type #

Methods

from1 :: forall (a :: k). Identity a -> Rep1 Identity a #

to1 :: forall (a :: k). Rep1 Identity a -> Identity a #

MonadBaseControl Identity Identity 
Instance details

Defined in Control.Monad.Trans.Control

Associated Types

type StM Identity a #

Cosieve ReifiedGetter Identity 
Instance details

Defined in Control.Lens.Reified

Methods

cosieve :: ReifiedGetter a b -> Identity a -> b #

Sieve ReifiedGetter Identity 
Instance details

Defined in Control.Lens.Reified

Methods

sieve :: ReifiedGetter a b -> a -> Identity b #

Unbox a => Vector Vector (Identity a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox a => MVector MVector (Identity a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Arbitrary a => Arbitrary (Identity a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (Identity a) #

shrink :: Identity a -> [Identity a] #

CoArbitrary a => CoArbitrary (Identity a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Identity a -> Gen b -> Gen b #

Function a => Function (Identity a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Identity a -> b) -> Identity a :-> b #

FromJSON a => FromJSON (Identity a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey a => FromJSONKey (Identity a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON a => ToJSON (Identity a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey a => ToJSONKey (Identity a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Data a => Data (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Identity a -> c (Identity a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Identity a) #

toConstr :: Identity a -> Constr #

dataTypeOf :: Identity a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Identity a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Identity a)) #

gmapT :: (forall b. Data b => b -> b) -> Identity a -> Identity a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Identity a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Identity a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Identity a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Identity a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Identity a -> m (Identity a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Identity a -> m (Identity a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Identity a -> m (Identity a) #

IsString a => IsString (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.String

Methods

fromString :: String -> Identity a #

Storable a => Storable (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

sizeOf :: Identity a -> Int #

alignment :: Identity a -> Int #

peekElemOff :: Ptr (Identity a) -> Int -> IO (Identity a) #

pokeElemOff :: Ptr (Identity a) -> Int -> Identity a -> IO () #

peekByteOff :: Ptr b -> Int -> IO (Identity a) #

pokeByteOff :: Ptr b -> Int -> Identity a -> IO () #

peek :: Ptr (Identity a) -> IO (Identity a) #

poke :: Ptr (Identity a) -> Identity a -> IO () #

Monoid a => Monoid (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

mempty :: Identity a #

mappend :: Identity a -> Identity a -> Identity a #

mconcat :: [Identity a] -> Identity a #

Semigroup a => Semigroup (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

(<>) :: Identity a -> Identity a -> Identity a #

sconcat :: NonEmpty (Identity a) -> Identity a #

stimes :: Integral b => b -> Identity a -> Identity a #

Bits a => Bits (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

FiniteBits a => FiniteBits (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Bounded a => Bounded (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Enum a => Enum (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Floating a => Floating (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

RealFloat a => RealFloat (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Generic (Identity a) 
Instance details

Defined in Data.Functor.Identity

Associated Types

type Rep (Identity a) :: Type -> Type #

Methods

from :: Identity a -> Rep (Identity a) x #

to :: Rep (Identity a) x -> Identity a #

Ix a => Ix (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Num a => Num (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Read a => Read (Identity a)

This instance would be equivalent to the derived instances of the Identity newtype if the runIdentity field were removed

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Fractional a => Fractional (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Integral a => Integral (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Real a => Real (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

toRational :: Identity a -> Rational #

RealFrac a => RealFrac (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

properFraction :: Integral b => Identity a -> (b, Identity a) #

truncate :: Integral b => Identity a -> b #

round :: Integral b => Identity a -> b #

ceiling :: Integral b => Identity a -> b #

floor :: Integral b => Identity a -> b #

Show a => Show (Identity a)

This instance would be equivalent to the derived instances of the Identity newtype if the runIdentity field were removed

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

showsPrec :: Int -> Identity a -> ShowS #

show :: Identity a -> String #

showList :: [Identity a] -> ShowS #

NFData a => NFData (Identity a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Identity a -> () #

Eq a => Eq (Identity a)

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

(==) :: Identity a -> Identity a -> Bool #

(/=) :: Identity a -> Identity a -> Bool #

Ord a => Ord (Identity a)

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

compare :: Identity a -> Identity a -> Ordering #

(<) :: Identity a -> Identity a -> Bool #

(<=) :: Identity a -> Identity a -> Bool #

(>) :: Identity a -> Identity a -> Bool #

(>=) :: Identity a -> Identity a -> Bool #

max :: Identity a -> Identity a -> Identity a #

min :: Identity a -> Identity a -> Identity a #

Hashable a => Hashable (Identity a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Identity a -> Int #

hash :: Identity a -> Int #

Ixed (Identity a) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (Identity a) -> Traversal' (Identity a) (IxValue (Identity a)) #

Wrapped (Identity a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Identity a) #

MonoFoldable (Identity a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (Identity a) -> m) -> Identity a -> m #

ofoldr :: (Element (Identity a) -> b -> b) -> b -> Identity a -> b #

ofoldl' :: (a0 -> Element (Identity a) -> a0) -> a0 -> Identity a -> a0 #

otoList :: Identity a -> [Element (Identity a)] #

oall :: (Element (Identity a) -> Bool) -> Identity a -> Bool #

oany :: (Element (Identity a) -> Bool) -> Identity a -> Bool #

onull :: Identity a -> Bool #

olength :: Identity a -> Int #

olength64 :: Identity a -> Int64 #

ocompareLength :: Integral i => Identity a -> i -> Ordering #

otraverse_ :: Applicative f => (Element (Identity a) -> f b) -> Identity a -> f () #

ofor_ :: Applicative f => Identity a -> (Element (Identity a) -> f b) -> f () #

omapM_ :: Applicative m => (Element (Identity a) -> m ()) -> Identity a -> m () #

oforM_ :: Applicative m => Identity a -> (Element (Identity a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (Identity a) -> m a0) -> a0 -> Identity a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (Identity a) -> m) -> Identity a -> m #

ofoldr1Ex :: (Element (Identity a) -> Element (Identity a) -> Element (Identity a)) -> Identity a -> Element (Identity a) #

ofoldl1Ex' :: (Element (Identity a) -> Element (Identity a) -> Element (Identity a)) -> Identity a -> Element (Identity a) #

headEx :: Identity a -> Element (Identity a) #

lastEx :: Identity a -> Element (Identity a) #

unsafeHead :: Identity a -> Element (Identity a) #

unsafeLast :: Identity a -> Element (Identity a) #

maximumByEx :: (Element (Identity a) -> Element (Identity a) -> Ordering) -> Identity a -> Element (Identity a) #

minimumByEx :: (Element (Identity a) -> Element (Identity a) -> Ordering) -> Identity a -> Element (Identity a) #

oelem :: Element (Identity a) -> Identity a -> Bool #

onotElem :: Element (Identity a) -> Identity a -> Bool #

MonoFunctor (Identity a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Identity a) -> Element (Identity a)) -> Identity a -> Identity a #

MonoPointed (Identity a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Identity a) -> Identity a #

MonoTraversable (Identity a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (Identity a) -> f (Element (Identity a))) -> Identity a -> f (Identity a) #

omapM :: Applicative m => (Element (Identity a) -> m (Element (Identity a))) -> Identity a -> m (Identity a) #

Pretty a => Pretty (Identity a)
>>> pretty (Identity 1)
1
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Identity a -> Doc ann #

prettyList :: [Identity a] -> Doc ann #

Prim a => Prim (Identity a)

Since: primitive-0.6.5.0

Instance details

Defined in Data.Primitive.Types

Unbox a => Unbox (Identity a) 
Instance details

Defined in Data.Vector.Unboxed.Base

t ~ Identity b => Rewrapped (Identity a) t 
Instance details

Defined in Control.Lens.Wrapped

Field1 (Identity a) (Identity b) a b 
Instance details

Defined in Control.Lens.Tuple

Methods

_1 :: Lens (Identity a) (Identity b) a b #

type Rep Identity 
Instance details

Defined in Data.Functor.Rep

type Rep Identity = ()
type Rep1 Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

type Rep1 Identity = D1 ('MetaData "Identity" "Data.Functor.Identity" "base" 'True) (C1 ('MetaCons "Identity" 'PrefixI 'True) (S1 ('MetaSel ('Just "runIdentity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1))
type StM Identity a 
Instance details

Defined in Control.Monad.Trans.Control

type StM Identity a = a
newtype MVector s (Identity a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s (Identity a) = MV_Identity (MVector s a)
type Rep (Identity a)

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

type Rep (Identity a) = D1 ('MetaData "Identity" "Data.Functor.Identity" "base" 'True) (C1 ('MetaCons "Identity" 'PrefixI 'True) (S1 ('MetaSel ('Just "runIdentity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))
type Index (Identity a) 
Instance details

Defined in Control.Lens.At

type Index (Identity a) = ()
type IxValue (Identity a) 
Instance details

Defined in Control.Lens.At

type IxValue (Identity a) = a
type Unwrapped (Identity a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (Identity a) = a
type Element (Identity a) 
Instance details

Defined in Data.MonoTraversable

type Element (Identity a) = a
newtype Vector (Identity a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector (Identity a) = V_Identity (Vector a)

forM :: (Traversable t, Monad m) => t a -> (a -> m b) -> m (t b) #

forM is mapM with its arguments flipped. For a version that ignores the results see forM_.

(<$!>) :: Monad m => (a -> b) -> m a -> m b infixl 4 #

Strict version of <$>.

Since: base-4.8.0.0

(<=<) :: Monad m => (b -> m c) -> (a -> m b) -> a -> m c infixr 1 #

Right-to-left composition of Kleisli arrows. (>=>), with the arguments flipped.

Note how this operator resembles function composition (.):

(.)   ::            (b ->   c) -> (a ->   b) -> a ->   c
(<=<) :: Monad m => (b -> m c) -> (a -> m b) -> a -> m c

(>=>) :: Monad m => (a -> m b) -> (b -> m c) -> a -> m c infixr 1 #

Left-to-right composition of Kleisli arrows.

'(bs >=> cs) a' can be understood as the do expression

do b <- bs a
   cs b

filterM :: Applicative m => (a -> m Bool) -> [a] -> m [a] #

This generalizes the list-based filter function.

foldM :: (Foldable t, Monad m) => (b -> a -> m b) -> b -> t a -> m b #

The foldM function is analogous to foldl, except that its result is encapsulated in a monad. Note that foldM works from left-to-right over the list arguments. This could be an issue where (>>) and the `folded function' are not commutative.

foldM f a1 [x1, x2, ..., xm]

==

do
  a2 <- f a1 x1
  a3 <- f a2 x2
  ...
  f am xm

If right-to-left evaluation is required, the input list should be reversed.

Note: foldM is the same as foldlM

foldM_ :: (Foldable t, Monad m) => (b -> a -> m b) -> b -> t a -> m () #

Like foldM, but discards the result.

forever :: Applicative f => f a -> f b #

Repeat an action indefinitely.

Examples

Expand

A common use of forever is to process input from network sockets, Handles, and channels (e.g. MVar and Chan).

For example, here is how we might implement an echo server, using forever both to listen for client connections on a network socket and to echo client input on client connection handles:

echoServer :: Socket -> IO ()
echoServer socket = forever $ do
  client <- accept socket
  forkFinally (echo client) (\_ -> hClose client)
  where
    echo :: Handle -> IO ()
    echo client = forever $
      hGetLine client >>= hPutStrLn client

Note that "forever" isn't necessarily non-terminating. If the action is in a MonadPlus and short-circuits after some number of iterations. then forever actually returns mzero, effectively short-circuiting its caller.

mfilter :: MonadPlus m => (a -> Bool) -> m a -> m a #

Direct MonadPlus equivalent of filter.

Examples

Expand

The filter function is just mfilter specialized to the list monad:

filter = ( mfilter :: (a -> Bool) -> [a] -> [a] )

An example using mfilter with the Maybe monad:

>>> mfilter odd (Just 1)
Just 1
>>> mfilter odd (Just 2)
Nothing

replicateM_ :: Applicative m => Int -> m a -> m () #

Like replicateM, but discards the result.

Examples

Expand
>>> replicateM_ 3 (putStrLn "a")
a
a
a

unless :: Applicative f => Bool -> f () -> f () #

The reverse of when.

zipWithM :: Applicative m => (a -> b -> m c) -> [a] -> [b] -> m [c] #

The zipWithM function generalizes zipWith to arbitrary applicative functors.

zipWithM_ :: Applicative m => (a -> b -> m c) -> [a] -> [b] -> m () #

zipWithM_ is the extension of zipWithM which ignores the final result.

class Monad m => MonadIO (m :: Type -> Type) where #

Monads in which IO computations may be embedded. Any monad built by applying a sequence of monad transformers to the IO monad will be an instance of this class.

Instances should satisfy the following laws, which state that liftIO is a transformer of monads:

Methods

liftIO :: IO a -> m a #

Lift a computation from the IO monad. This allows us to run IO computations in any monadic stack, so long as it supports these kinds of operations (i.e. IO is the base monad for the stack).

Example

Expand
import Control.Monad.Trans.State -- from the "transformers" library

printState :: Show s => StateT s IO ()
printState = do
  state <- get
  liftIO $ print state

Had we omitted liftIO, we would have ended up with this error:

• Couldn't match type ‘IO’ with ‘StateT s IO’
 Expected type: StateT s IO ()
   Actual type: IO ()

The important part here is the mismatch between StateT s IO () and IO ().

Luckily, we know of a function that takes an IO a and returns an (m a): liftIO, enabling us to run the program and see the expected results:

> evalStateT printState "hello"
"hello"

> evalStateT printState 3
3

Instances

Instances details
MonadIO IO

Since: base-4.9.0.0

Instance details

Defined in Control.Monad.IO.Class

Methods

liftIO :: IO a -> IO a #

MonadIO Acquire 
Instance details

Defined in Data.Acquire.Internal

Methods

liftIO :: IO a -> Acquire a #

MonadIO Q 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

liftIO :: IO a -> Q a #

MonadIO m => MonadIO (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

liftIO :: IO a -> LoggingT m a #

MonadIO m => MonadIO (NoLoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

liftIO :: IO a -> NoLoggingT m a #

MonadIO m => MonadIO (WriterLoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

liftIO :: IO a -> WriterLoggingT m a #

MonadIO m => MonadIO (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

liftIO :: IO a -> ResourceT m a #

MonadIO (RIO env) 
Instance details

Defined in RIO.Prelude.RIO

Methods

liftIO :: IO a -> RIO env a #

MonadIO m => MonadIO (ListT m) 
Instance details

Defined in Control.Monad.Trans.List

Methods

liftIO :: IO a -> ListT m a #

MonadIO m => MonadIO (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

liftIO :: IO a -> MaybeT m a #

(Functor f, MonadIO m) => MonadIO (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

liftIO :: IO a -> FreeT f m a #

MonadIO m => MonadIO (AppT app m) Source # 
Instance details

Defined in Stackctl.CLI

Methods

liftIO :: IO a -> AppT app m a #

(Monoid w, Functor m, MonadIO m) => MonadIO (AccumT w m) 
Instance details

Defined in Control.Monad.Trans.Accum

Methods

liftIO :: IO a -> AccumT w m a #

(Error e, MonadIO m) => MonadIO (ErrorT e m) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

liftIO :: IO a -> ErrorT e m a #

MonadIO m => MonadIO (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

liftIO :: IO a -> ExceptT e m a #

MonadIO m => MonadIO (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

liftIO :: IO a -> IdentityT m a #

MonadIO m => MonadIO (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

liftIO :: IO a -> ReaderT r m a #

MonadIO m => MonadIO (SelectT r m) 
Instance details

Defined in Control.Monad.Trans.Select

Methods

liftIO :: IO a -> SelectT r m a #

MonadIO m => MonadIO (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Lazy

Methods

liftIO :: IO a -> StateT s m a #

MonadIO m => MonadIO (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

liftIO :: IO a -> StateT s m a #

(Monoid w, MonadIO m) => MonadIO (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

liftIO :: IO a -> WriterT w m a #

(Monoid w, MonadIO m) => MonadIO (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

liftIO :: IO a -> WriterT w m a #

MonadIO m => MonadIO (ConduitT i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

liftIO :: IO a -> ConduitT i o m a #

MonadIO m => MonadIO (ContT r m) 
Instance details

Defined in Control.Monad.Trans.Cont

Methods

liftIO :: IO a -> ContT r m a #

(Monoid w, MonadIO m) => MonadIO (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.Lazy

Methods

liftIO :: IO a -> RWST r w s m a #

(Monoid w, MonadIO m) => MonadIO (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.Strict

Methods

liftIO :: IO a -> RWST r w s m a #

MonadIO m => MonadIO (Pipe l i o u m) 
Instance details

Defined in Data.Conduit.Internal.Pipe

Methods

liftIO :: IO a -> Pipe l i o u m a #

biList :: Bifoldable t => t a a -> [a] #

Collects the list of elements of a structure, from left to right.

Examples

Expand

Basic usage:

>>> biList (18, 42)
[18,42]
>>> biList (Left 18)
[18]

Since: base-4.10.0.0

biall :: Bifoldable t => (a -> Bool) -> (b -> Bool) -> t a b -> Bool #

Determines whether all elements of the structure satisfy their appropriate predicate argument. Empty structures yield True.

Examples

Expand

Basic usage:

>>> biall even isDigit (27, 't')
False
>>> biall even isDigit (26, '8')
True
>>> biall even isDigit (Left 27)
False
>>> biall even isDigit (Left 26)
True
>>> biall even isDigit (BiList [26, 52] ['3', '8'])
True

Empty structures yield True:

>>> biall even isDigit (BiList [] [])
True

Since: base-4.10.0.0

biand :: Bifoldable t => t Bool Bool -> Bool #

biand returns the conjunction of a container of Bools. For the result to be True, the container must be finite; False, however, results from a False value finitely far from the left end.

Examples

Expand

Basic usage:

>>> biand (True, False)
False
>>> biand (True, True)
True
>>> biand (Left True)
True

Empty structures yield True:

>>> biand (BiList [] [])
True

A False value finitely far from the left end yields False (short circuit):

>>> biand (BiList [True, True, False, True] (repeat True))
False

A False value infinitely far from the left end hangs:

> biand (BiList (repeat True) [False])
* Hangs forever *

An infinitely True value hangs:

> biand (BiList (repeat True) [])
* Hangs forever *

Since: base-4.10.0.0

biany :: Bifoldable t => (a -> Bool) -> (b -> Bool) -> t a b -> Bool #

Determines whether any element of the structure satisfies its appropriate predicate argument. Empty structures yield False.

Examples

Expand

Basic usage:

>>> biany even isDigit (27, 't')
False
>>> biany even isDigit (27, '8')
True
>>> biany even isDigit (26, 't')
True
>>> biany even isDigit (Left 27)
False
>>> biany even isDigit (Left 26)
True
>>> biany even isDigit (BiList [27, 53] ['t', '8'])
True

Empty structures yield False:

>>> biany even isDigit (BiList [] [])
False

Since: base-4.10.0.0

biasum :: (Bifoldable t, Alternative f) => t (f a) (f a) -> f a #

The sum of a collection of actions, generalizing biconcat.

Examples

Expand

Basic usage:

>>> biasum (Nothing, Nothing)
Nothing
>>> biasum (Nothing, Just 42)
Just 42
>>> biasum (Just 18, Nothing)
Just 18
>>> biasum (Just 18, Just 42)
Just 18

Since: base-4.10.0.0

biconcat :: Bifoldable t => t [a] [a] -> [a] #

Reduces a structure of lists to the concatenation of those lists.

Examples

Expand

Basic usage:

>>> biconcat ([1, 2, 3], [4, 5])
[1,2,3,4,5]
>>> biconcat (Left [1, 2, 3])
[1,2,3]
>>> biconcat (BiList [[1, 2, 3, 4, 5], [6, 7, 8]] [[9]])
[1,2,3,4,5,6,7,8,9]

Since: base-4.10.0.0

biconcatMap :: Bifoldable t => (a -> [c]) -> (b -> [c]) -> t a b -> [c] #

Given a means of mapping the elements of a structure to lists, computes the concatenation of all such lists in order.

Examples

Expand

Basic usage:

>>> biconcatMap (take 3) (fmap digitToInt) ([1..], "89")
[1,2,3,8,9]
>>> biconcatMap (take 3) (fmap digitToInt) (Left [1..])
[1,2,3]
>>> biconcatMap (take 3) (fmap digitToInt) (Right "89")
[8,9]

Since: base-4.10.0.0

bielem :: (Bifoldable t, Eq a) => a -> t a a -> Bool #

Does the element occur in the structure?

Examples

Expand

Basic usage:

>>> bielem 42 (17, 42)
True
>>> bielem 42 (17, 43)
False
>>> bielem 42 (Left 42)
True
>>> bielem 42 (Right 13)
False
>>> bielem 42 (BiList [1..5] [1..100])
True
>>> bielem 42 (BiList [1..5] [1..41])
False

Since: base-4.10.0.0

bifind :: Bifoldable t => (a -> Bool) -> t a a -> Maybe a #

The bifind function takes a predicate and a structure and returns the leftmost element of the structure matching the predicate, or Nothing if there is no such element.

Examples

Expand

Basic usage:

>>> bifind even (27, 53)
Nothing
>>> bifind even (27, 52)
Just 52
>>> bifind even (26, 52)
Just 26

Empty structures always yield Nothing:

>>> bifind even (BiList [] [])
Nothing

Since: base-4.10.0.0

bifoldl' :: Bifoldable t => (a -> b -> a) -> (a -> c -> a) -> a -> t b c -> a #

As bifoldl, but strict in the result of the reduction functions at each step.

This ensures that each step of the bifold is forced to weak head normal form before being applied, avoiding the collection of thunks that would otherwise occur. This is often what you want to strictly reduce a finite structure to a single, monolithic result (e.g., bilength).

Since: base-4.10.0.0

bifoldl1 :: Bifoldable t => (a -> a -> a) -> t a a -> a #

A variant of bifoldl that has no base case, and thus may only be applied to non-empty structures.

Examples

Expand

Basic usage:

>>> bifoldl1 (+) (5, 7)
12
>>> bifoldl1 (+) (Right 7)
7
>>> bifoldl1 (+) (Left 5)
5
> bifoldl1 (+) (BiList [1, 2] [3, 4])
10 -- ((1 + 2) + 3) + 4
>>> bifoldl1 (+) (BiList [1, 2] [])
3

On empty structures, this function throws an exception:

>>> bifoldl1 (+) (BiList [] [])
*** Exception: bifoldl1: empty structure
...

Since: base-4.10.0.0

bifoldlM :: (Bifoldable t, Monad m) => (a -> b -> m a) -> (a -> c -> m a) -> a -> t b c -> m a #

Left associative monadic bifold over a structure.

Examples

Expand

Basic usage:

>>> bifoldlM (\a b -> print b >> pure a) (\a c -> print (show c) >> pure a) 42 ("Hello", True)
"Hello"
"True"
42
>>> bifoldlM (\a b -> print b >> pure a) (\a c -> print (show c) >> pure a) 42 (Right True)
"True"
42
>>> bifoldlM (\a b -> print b >> pure a) (\a c -> print (show c) >> pure a) 42 (Left "Hello")
"Hello"
42

Since: base-4.10.0.0

bifoldr' :: Bifoldable t => (a -> c -> c) -> (b -> c -> c) -> c -> t a b -> c #

As bifoldr, but strict in the result of the reduction functions at each step.

Since: base-4.10.0.0

bifoldr1 :: Bifoldable t => (a -> a -> a) -> t a a -> a #

A variant of bifoldr that has no base case, and thus may only be applied to non-empty structures.

Examples

Expand

Basic usage:

>>> bifoldr1 (+) (5, 7)
12
>>> bifoldr1 (+) (Right 7)
7
>>> bifoldr1 (+) (Left 5)
5
> bifoldr1 (+) (BiList [1, 2] [3, 4])
10 -- 1 + (2 + (3 + 4))
>>> bifoldr1 (+) (BiList [1, 2] [])
3

On empty structures, this function throws an exception:

>>> bifoldr1 (+) (BiList [] [])
*** Exception: bifoldr1: empty structure
...

Since: base-4.10.0.0

bifoldrM :: (Bifoldable t, Monad m) => (a -> c -> m c) -> (b -> c -> m c) -> c -> t a b -> m c #

Right associative monadic bifold over a structure.

Since: base-4.10.0.0

bifor_ :: (Bifoldable t, Applicative f) => t a b -> (a -> f c) -> (b -> f d) -> f () #

As bitraverse_, but with the structure as the primary argument. For a version that doesn't ignore the results, see bifor.

Examples

Expand

Basic usage:

>>> bifor_ ("Hello", True) print (print . show)
"Hello"
"True"
>>> bifor_ (Right True) print (print . show)
"True"
>>> bifor_ (Left "Hello") print (print . show)
"Hello"

Since: base-4.10.0.0

bilength :: Bifoldable t => t a b -> Int #

Returns the size/length of a finite structure as an Int.

Examples

Expand

Basic usage:

>>> bilength (True, 42)
2
>>> bilength (Right 42)
1
>>> bilength (BiList [1,2,3] [4,5])
5
>>> bilength (BiList [] [])
0

On infinite structures, this function hangs:

> bilength (BiList [1..] [])
* Hangs forever *

Since: base-4.10.0.0

bimaximum :: (Bifoldable t, Ord a) => t a a -> a #

The largest element of a non-empty structure.

Examples

Expand

Basic usage:

>>> bimaximum (42, 17)
42
>>> bimaximum (Right 42)
42
>>> bimaximum (BiList [13, 29, 4] [18, 1, 7])
29
>>> bimaximum (BiList [13, 29, 4] [])
29

On empty structures, this function throws an exception:

>>> bimaximum (BiList [] [])
*** Exception: bimaximum: empty structure
...

Since: base-4.10.0.0

bimaximumBy :: Bifoldable t => (a -> a -> Ordering) -> t a a -> a #

The largest element of a non-empty structure with respect to the given comparison function.

Examples

Expand

Basic usage:

>>> bimaximumBy compare (42, 17)
42
>>> bimaximumBy compare (Left 17)
17
>>> bimaximumBy compare (BiList [42, 17, 23] [-5, 18])
42

On empty structures, this function throws an exception:

>>> bimaximumBy compare (BiList [] [])
*** Exception: bifoldr1: empty structure
...

Since: base-4.10.0.0

biminimum :: (Bifoldable t, Ord a) => t a a -> a #

The least element of a non-empty structure.

Examples

Expand

Basic usage:

>>> biminimum (42, 17)
17
>>> biminimum (Right 42)
42
>>> biminimum (BiList [13, 29, 4] [18, 1, 7])
1
>>> biminimum (BiList [13, 29, 4] [])
4

On empty structures, this function throws an exception:

>>> biminimum (BiList [] [])
*** Exception: biminimum: empty structure
...

Since: base-4.10.0.0

biminimumBy :: Bifoldable t => (a -> a -> Ordering) -> t a a -> a #

The least element of a non-empty structure with respect to the given comparison function.

Examples

Expand

Basic usage:

>>> biminimumBy compare (42, 17)
17
>>> biminimumBy compare (Left 17)
17
>>> biminimumBy compare (BiList [42, 17, 23] [-5, 18])
-5

On empty structures, this function throws an exception:

>>> biminimumBy compare (BiList [] [])
*** Exception: bifoldr1: empty structure
...

Since: base-4.10.0.0

binotElem :: (Bifoldable t, Eq a) => a -> t a a -> Bool #

binotElem is the negation of bielem.

Examples

Expand

Basic usage:

>>> binotElem 42 (17, 42)
False
>>> binotElem 42 (17, 43)
True
>>> binotElem 42 (Left 42)
False
>>> binotElem 42 (Right 13)
True
>>> binotElem 42 (BiList [1..5] [1..100])
False
>>> binotElem 42 (BiList [1..5] [1..41])
True

Since: base-4.10.0.0

binull :: Bifoldable t => t a b -> Bool #

Test whether the structure is empty.

Examples

Expand

Basic usage:

>>> binull (18, 42)
False
>>> binull (Right 42)
False
>>> binull (BiList [] [])
True

Since: base-4.10.0.0

bior :: Bifoldable t => t Bool Bool -> Bool #

bior returns the disjunction of a container of Bools. For the result to be False, the container must be finite; True, however, results from a True value finitely far from the left end.

Examples

Expand

Basic usage:

>>> bior (True, False)
True
>>> bior (False, False)
False
>>> bior (Left True)
True

Empty structures yield False:

>>> bior (BiList [] [])
False

A True value finitely far from the left end yields True (short circuit):

>>> bior (BiList [False, False, True, False] (repeat False))
True

A True value infinitely far from the left end hangs:

> bior (BiList (repeat False) [True])
* Hangs forever *

An infinitely False value hangs:

> bior (BiList (repeat False) [])
* Hangs forever *

Since: base-4.10.0.0

biproduct :: (Bifoldable t, Num a) => t a a -> a #

The biproduct function computes the product of the numbers of a structure.

Examples

Expand

Basic usage:

>>> biproduct (42, 17)
714
>>> biproduct (Right 42)
42
>>> biproduct (BiList [13, 29, 4] [18, 1, 7])
190008
>>> biproduct (BiList [13, 29, 4] [])
1508
>>> biproduct (BiList [] [])
1

Since: base-4.10.0.0

bisequence_ :: (Bifoldable t, Applicative f) => t (f a) (f b) -> f () #

Evaluate each action in the structure from left to right, and ignore the results. For a version that doesn't ignore the results, see bisequence.

Examples

Expand

Basic usage:

>>> bisequence_ (print "Hello", print "World")
"Hello"
"World"
>>> bisequence_ (Left (print "Hello"))
"Hello"
>>> bisequence_ (Right (print "World"))
"World"

Since: base-4.10.0.0

bisum :: (Bifoldable t, Num a) => t a a -> a #

The bisum function computes the sum of the numbers of a structure.

Examples

Expand

Basic usage:

>>> bisum (42, 17)
59
>>> bisum (Right 42)
42
>>> bisum (BiList [13, 29, 4] [18, 1, 7])
72
>>> bisum (BiList [13, 29, 4] [])
46
>>> bisum (BiList [] [])
0

Since: base-4.10.0.0

bitraverse_ :: (Bifoldable t, Applicative f) => (a -> f c) -> (b -> f d) -> t a b -> f () #

Map each element of a structure using one of two actions, evaluate these actions from left to right, and ignore the results. For a version that doesn't ignore the results, see bitraverse.

Examples

Expand

Basic usage:

>>> bitraverse_ print (print . show) ("Hello", True)
"Hello"
"True"
>>> bitraverse_ print (print . show) (Right True)
"True"
>>> bitraverse_ print (print . show) (Left "Hello")
"Hello"

Since: base-4.10.0.0

class Bifoldable (p :: TYPE LiftedRep -> TYPE LiftedRep -> Type) where #

Bifoldable identifies foldable structures with two different varieties of elements (as opposed to Foldable, which has one variety of element). Common examples are Either and (,):

instance Bifoldable Either where
  bifoldMap f _ (Left  a) = f a
  bifoldMap _ g (Right b) = g b

instance Bifoldable (,) where
  bifoldr f g z (a, b) = f a (g b z)

Some examples below also use the following BiList to showcase empty Bifoldable behaviors when relevant (Either and (,) containing always exactly resp. 1 and 2 elements):

data BiList a b = BiList [a] [b]

instance Bifoldable BiList where
  bifoldr f g z (BiList as bs) = foldr f (foldr g z bs) as

A minimal Bifoldable definition consists of either bifoldMap or bifoldr. When defining more than this minimal set, one should ensure that the following identities hold:

bifoldbifoldMap id id
bifoldMap f g ≡ bifoldr (mappend . f) (mappend . g) mempty
bifoldr f g z t ≡ appEndo (bifoldMap (Endo . f) (Endo . g) t) z

If the type is also a Bifunctor instance, it should satisfy:

bifoldMap f g ≡ bifold . bimap f g

which implies that

bifoldMap f g . bimap h i ≡ bifoldMap (f . h) (g . i)

Since: base-4.10.0.0

Minimal complete definition

bifoldr | bifoldMap

Methods

bifold :: Monoid m => p m m -> m #

Combines the elements of a structure using a monoid.

bifoldbifoldMap id id

Examples

Expand

Basic usage:

>>> bifold (Right [1, 2, 3])
[1,2,3]
>>> bifold (Left [5, 6])
[5,6]
>>> bifold ([1, 2, 3], [4, 5])
[1,2,3,4,5]
>>> bifold (Product 6, Product 7)
Product {getProduct = 42}
>>> bifold (Sum 6, Sum 7)
Sum {getSum = 13}

Since: base-4.10.0.0

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> p a b -> m #

Combines the elements of a structure, given ways of mapping them to a common monoid.

bifoldMap f g ≡ bifoldr (mappend . f) (mappend . g) mempty

Examples

Expand

Basic usage:

>>> bifoldMap (take 3) (fmap digitToInt) ([1..], "89")
[1,2,3,8,9]
>>> bifoldMap (take 3) (fmap digitToInt) (Left [1..])
[1,2,3]
>>> bifoldMap (take 3) (fmap digitToInt) (Right "89")
[8,9]

Since: base-4.10.0.0

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> p a b -> c #

Combines the elements of a structure in a right associative manner. Given a hypothetical function toEitherList :: p a b -> [Either a b] yielding a list of all elements of a structure in order, the following would hold:

bifoldr f g z ≡ foldr (either f g) z . toEitherList

Examples

Expand

Basic usage:

> bifoldr (+) (*) 3 (5, 7)
26 -- 5 + (7 * 3)

> bifoldr (+) (*) 3 (7, 5)
22 -- 7 + (5 * 3)

> bifoldr (+) (*) 3 (Right 5)
15 -- 5 * 3

> bifoldr (+) (*) 3 (Left 5)
8 -- 5 + 3

Since: base-4.10.0.0

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> p a b -> c #

Combines the elements of a structure in a left associative manner. Given a hypothetical function toEitherList :: p a b -> [Either a b] yielding a list of all elements of a structure in order, the following would hold:

bifoldl f g z
     ≡ foldl (acc -> either (f acc) (g acc)) z . toEitherList

Note that if you want an efficient left-fold, you probably want to use bifoldl' instead of bifoldl. The reason is that the latter does not force the "inner" results, resulting in a thunk chain which then must be evaluated from the outside-in.

Examples

Expand

Basic usage:

> bifoldl (+) (*) 3 (5, 7)
56 -- (5 + 3) * 7

> bifoldl (+) (*) 3 (7, 5)
50 -- (7 + 3) * 5

> bifoldl (+) (*) 3 (Right 5)
15 -- 5 * 3

> bifoldl (+) (*) 3 (Left 5)
8 -- 5 + 3

Since: base-4.10.0.0

Instances

Instances details
Bifoldable Either

Since: base-4.10.0.0

Instance details

Defined in Data.Bifoldable

Methods

bifold :: Monoid m => Either m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> Either a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> Either a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> Either a b -> c #

Bifoldable Arg

Since: base-4.10.0.0

Instance details

Defined in Data.Semigroup

Methods

bifold :: Monoid m => Arg m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> Arg a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> Arg a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> Arg a b -> c #

Bifoldable Map

Since: containers-0.6.3.1

Instance details

Defined in Data.Map.Internal

Methods

bifold :: Monoid m => Map m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> Map a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> Map a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> Map a b -> c #

Bifoldable Either 
Instance details

Defined in Data.Strict.Either

Methods

bifold :: Monoid m => Either m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> Either a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> Either a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> Either a b -> c #

Bifoldable These 
Instance details

Defined in Data.Strict.These

Methods

bifold :: Monoid m => These m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> These a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> These a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> These a b -> c #

Bifoldable Pair 
Instance details

Defined in Data.Strict.Tuple

Methods

bifold :: Monoid m => Pair m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> Pair a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> Pair a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> Pair a b -> c #

Bifoldable These 
Instance details

Defined in Data.These

Methods

bifold :: Monoid m => These m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> These a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> These a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> These a b -> c #

Bifoldable HashMap

Since: unordered-containers-0.2.11

Instance details

Defined in Data.HashMap.Internal

Methods

bifold :: Monoid m => HashMap m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> HashMap a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> HashMap a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> HashMap a b -> c #

Bifoldable (,)

Since: base-4.10.0.0

Instance details

Defined in Data.Bifoldable

Methods

bifold :: Monoid m => (m, m) -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> (a, b) -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> (a, b) -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> (a, b) -> c #

Bifoldable (Const :: Type -> TYPE LiftedRep -> Type)

Since: base-4.10.0.0

Instance details

Defined in Data.Bifoldable

Methods

bifold :: Monoid m => Const m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> Const a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> Const a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> Const a b -> c #

Foldable f => Bifoldable (CofreeF f) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

bifold :: Monoid m => CofreeF f m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> CofreeF f a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> CofreeF f a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> CofreeF f a b -> c #

Foldable f => Bifoldable (FreeF f) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

bifold :: Monoid m => FreeF f m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> FreeF f a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> FreeF f a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> FreeF f a b -> c #

Bifoldable (Tagged :: TYPE LiftedRep -> Type -> Type) 
Instance details

Defined in Data.Tagged

Methods

bifold :: Monoid m => Tagged m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> Tagged a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> Tagged a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> Tagged a b -> c #

Bifoldable (Constant :: Type -> TYPE LiftedRep -> Type) 
Instance details

Defined in Data.Functor.Constant

Methods

bifold :: Monoid m => Constant m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> Constant a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> Constant a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> Constant a b -> c #

Bifoldable ((,,) x)

Since: base-4.10.0.0

Instance details

Defined in Data.Bifoldable

Methods

bifold :: Monoid m => (x, m, m) -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> (x, a, b) -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> (x, a, b) -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> (x, a, b) -> c #

Bifoldable (K1 i :: Type -> TYPE LiftedRep -> Type)

Since: base-4.10.0.0

Instance details

Defined in Data.Bifoldable

Methods

bifold :: Monoid m => K1 i m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> K1 i a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> K1 i a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> K1 i a b -> c #

Bifoldable ((,,,) x y)

Since: base-4.10.0.0

Instance details

Defined in Data.Bifoldable

Methods

bifold :: Monoid m => (x, y, m, m) -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> (x, y, a, b) -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> (x, y, a, b) -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> (x, y, a, b) -> c #

Foldable f => Bifoldable (Clown f :: TYPE LiftedRep -> TYPE LiftedRep -> Type) 
Instance details

Defined in Data.Bifunctor.Clown

Methods

bifold :: Monoid m => Clown f m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> Clown f a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> Clown f a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> Clown f a b -> c #

Bifoldable p => Bifoldable (Flip p) 
Instance details

Defined in Data.Bifunctor.Flip

Methods

bifold :: Monoid m => Flip p m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> Flip p a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> Flip p a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> Flip p a b -> c #

Foldable g => Bifoldable (Joker g :: TYPE LiftedRep -> TYPE LiftedRep -> Type) 
Instance details

Defined in Data.Bifunctor.Joker

Methods

bifold :: Monoid m => Joker g m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> Joker g a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> Joker g a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> Joker g a b -> c #

Bifoldable p => Bifoldable (WrappedBifunctor p) 
Instance details

Defined in Data.Bifunctor.Wrapped

Methods

bifold :: Monoid m => WrappedBifunctor p m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> WrappedBifunctor p a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> WrappedBifunctor p a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> WrappedBifunctor p a b -> c #

Bifoldable ((,,,,) x y z)

Since: base-4.10.0.0

Instance details

Defined in Data.Bifoldable

Methods

bifold :: Monoid m => (x, y, z, m, m) -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> (x, y, z, a, b) -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> (x, y, z, a, b) -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> (x, y, z, a, b) -> c #

(Bifoldable f, Bifoldable g) => Bifoldable (Product f g) 
Instance details

Defined in Data.Bifunctor.Product

Methods

bifold :: Monoid m => Product f g m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> Product f g a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> Product f g a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> Product f g a b -> c #

(Bifoldable p, Bifoldable q) => Bifoldable (Sum p q) 
Instance details

Defined in Data.Bifunctor.Sum

Methods

bifold :: Monoid m => Sum p q m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> Sum p q a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> Sum p q a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> Sum p q a b -> c #

Bifoldable ((,,,,,) x y z w)

Since: base-4.10.0.0

Instance details

Defined in Data.Bifoldable

Methods

bifold :: Monoid m => (x, y, z, w, m, m) -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> (x, y, z, w, a, b) -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> (x, y, z, w, a, b) -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> (x, y, z, w, a, b) -> c #

(Foldable f, Bifoldable p) => Bifoldable (Tannen f p) 
Instance details

Defined in Data.Bifunctor.Tannen

Methods

bifold :: Monoid m => Tannen f p m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> Tannen f p a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> Tannen f p a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> Tannen f p a b -> c #

Bifoldable ((,,,,,,) x y z w v)

Since: base-4.10.0.0

Instance details

Defined in Data.Bifoldable

Methods

bifold :: Monoid m => (x, y, z, w, v, m, m) -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> (x, y, z, w, v, a, b) -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> (x, y, z, w, v, a, b) -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> (x, y, z, w, v, a, b) -> c #

(Bifoldable p, Foldable f, Foldable g) => Bifoldable (Biff p f g) 
Instance details

Defined in Data.Bifunctor.Biff

Methods

bifold :: Monoid m => Biff p f g m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> Biff p f g a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> Biff p f g a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> Biff p f g a b -> c #

bifor :: (Bitraversable t, Applicative f) => t a b -> (a -> f c) -> (b -> f d) -> f (t c d) #

bifor is bitraverse with the structure as the first argument. For a version that ignores the results, see bifor_.

Examples

Expand

Basic usage:

>>> bifor (Left []) listToMaybe (find even)
Nothing
>>> bifor (Left [1, 2, 3]) listToMaybe (find even)
Just (Left 1)
>>> bifor (Right [4, 5]) listToMaybe (find even)
Just (Right 4)
>>> bifor ([1, 2, 3], [4, 5]) listToMaybe (find even)
Just (1,4)
>>> bifor ([], [4, 5]) listToMaybe (find even)
Nothing

Since: base-4.10.0.0

bimapAccumL :: Bitraversable t => (a -> b -> (a, c)) -> (a -> d -> (a, e)) -> a -> t b d -> (a, t c e) #

The bimapAccumL function behaves like a combination of bimap and bifoldl; it traverses a structure from left to right, threading a state of type a and using the given actions to compute new elements for the structure.

Examples

Expand

Basic usage:

>>> bimapAccumL (\acc bool -> (acc + 1, show bool)) (\acc string -> (acc * 2, reverse string)) 3 (True, "foo")
(8,("True","oof"))

Since: base-4.10.0.0

bimapAccumR :: Bitraversable t => (a -> b -> (a, c)) -> (a -> d -> (a, e)) -> a -> t b d -> (a, t c e) #

The bimapAccumR function behaves like a combination of bimap and bifoldr; it traverses a structure from right to left, threading a state of type a and using the given actions to compute new elements for the structure.

Examples

Expand

Basic usage:

>>> bimapAccumR (\acc bool -> (acc + 1, show bool)) (\acc string -> (acc * 2, reverse string)) 3 (True, "foo")
(7,("True","oof"))

Since: base-4.10.0.0

bisequence :: (Bitraversable t, Applicative f) => t (f a) (f b) -> f (t a b) #

Sequences all the actions in a structure, building a new structure with the same shape using the results of the actions. For a version that ignores the results, see bisequence_.

bisequencebitraverse id id

Examples

Expand

Basic usage:

>>> bisequence (Just 4, Nothing)
Nothing
>>> bisequence (Just 4, Just 5)
Just (4,5)
>>> bisequence ([1, 2, 3], [4, 5])
[(1,4),(1,5),(2,4),(2,5),(3,4),(3,5)]

Since: base-4.10.0.0

class (Bifunctor t, Bifoldable t) => Bitraversable (t :: Type -> Type -> Type) where #

Bitraversable identifies bifunctorial data structures whose elements can be traversed in order, performing Applicative or Monad actions at each element, and collecting a result structure with the same shape.

As opposed to Traversable data structures, which have one variety of element on which an action can be performed, Bitraversable data structures have two such varieties of elements.

A definition of bitraverse must satisfy the following laws:

Naturality
bitraverse (t . f) (t . g) ≡ t . bitraverse f g for every applicative transformation t
Identity
bitraverse Identity IdentityIdentity
Composition
Compose . fmap (bitraverse g1 g2) . bitraverse f1 f2 ≡ bitraverse (Compose . fmap g1 . f1) (Compose . fmap g2 . f2)

where an applicative transformation is a function

t :: (Applicative f, Applicative g) => f a -> g a

preserving the Applicative operations:

t (pure x) = pure x
t (f <*> x) = t f <*> t x

and the identity functor Identity and composition functors Compose are from Data.Functor.Identity and Data.Functor.Compose.

Some simple examples are Either and (,):

instance Bitraversable Either where
  bitraverse f _ (Left x) = Left <$> f x
  bitraverse _ g (Right y) = Right <$> g y

instance Bitraversable (,) where
  bitraverse f g (x, y) = (,) <$> f x <*> g y

Bitraversable relates to its superclasses in the following ways:

bimap f g ≡ runIdentity . bitraverse (Identity . f) (Identity . g)
bifoldMap f g = getConst . bitraverse (Const . f) (Const . g)

These are available as bimapDefault and bifoldMapDefault respectively.

Since: base-4.10.0.0

Minimal complete definition

Nothing

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> t a b -> f (t c d) #

Evaluates the relevant functions at each element in the structure, running the action, and builds a new structure with the same shape, using the results produced from sequencing the actions.

bitraverse f g ≡ bisequenceA . bimap f g

For a version that ignores the results, see bitraverse_.

Examples

Expand

Basic usage:

>>> bitraverse listToMaybe (find odd) (Left [])
Nothing
>>> bitraverse listToMaybe (find odd) (Left [1, 2, 3])
Just (Left 1)
>>> bitraverse listToMaybe (find odd) (Right [4, 5])
Just (Right 5)
>>> bitraverse listToMaybe (find odd) ([1, 2, 3], [4, 5])
Just (1,5)
>>> bitraverse listToMaybe (find odd) ([], [4, 5])
Nothing

Since: base-4.10.0.0

Instances

Instances details
Bitraversable Either

Since: base-4.10.0.0

Instance details

Defined in Data.Bitraversable

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> Either a b -> f (Either c d) #

Bitraversable Arg

Since: base-4.10.0.0

Instance details

Defined in Data.Semigroup

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> Arg a b -> f (Arg c d) #

Bitraversable Either 
Instance details

Defined in Data.Strict.Either

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> Either a b -> f (Either c d) #

Bitraversable These 
Instance details

Defined in Data.Strict.These

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> These a b -> f (These c d) #

Bitraversable Pair 
Instance details

Defined in Data.Strict.Tuple

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> Pair a b -> f (Pair c d) #

Bitraversable These 
Instance details

Defined in Data.These

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> These a b -> f (These c d) #

Bitraversable (,)

Since: base-4.10.0.0

Instance details

Defined in Data.Bitraversable

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> (a, b) -> f (c, d) #

Bitraversable (Const :: Type -> Type -> Type)

Since: base-4.10.0.0

Instance details

Defined in Data.Bitraversable

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> Const a b -> f (Const c d) #

Traversable f => Bitraversable (CofreeF f) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

bitraverse :: Applicative f0 => (a -> f0 c) -> (b -> f0 d) -> CofreeF f a b -> f0 (CofreeF f c d) #

Traversable f => Bitraversable (FreeF f) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

bitraverse :: Applicative f0 => (a -> f0 c) -> (b -> f0 d) -> FreeF f a b -> f0 (FreeF f c d) #

Bitraversable (Tagged :: Type -> Type -> Type) 
Instance details

Defined in Data.Tagged

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> Tagged a b -> f (Tagged c d) #

Bitraversable (Constant :: Type -> Type -> Type) 
Instance details

Defined in Data.Functor.Constant

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> Constant a b -> f (Constant c d) #

Bitraversable ((,,) x)

Since: base-4.10.0.0

Instance details

Defined in Data.Bitraversable

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> (x, a, b) -> f (x, c, d) #

Bitraversable (K1 i :: Type -> Type -> Type)

Since: base-4.10.0.0

Instance details

Defined in Data.Bitraversable

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> K1 i a b -> f (K1 i c d) #

Bitraversable ((,,,) x y)

Since: base-4.10.0.0

Instance details

Defined in Data.Bitraversable

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> (x, y, a, b) -> f (x, y, c, d) #

Traversable f => Bitraversable (Clown f :: Type -> Type -> Type) 
Instance details

Defined in Data.Bifunctor.Clown

Methods

bitraverse :: Applicative f0 => (a -> f0 c) -> (b -> f0 d) -> Clown f a b -> f0 (Clown f c d) #

Bitraversable p => Bitraversable (Flip p) 
Instance details

Defined in Data.Bifunctor.Flip

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> Flip p a b -> f (Flip p c d) #

Traversable g => Bitraversable (Joker g :: Type -> Type -> Type) 
Instance details

Defined in Data.Bifunctor.Joker

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> Joker g a b -> f (Joker g c d) #

Bitraversable p => Bitraversable (WrappedBifunctor p) 
Instance details

Defined in Data.Bifunctor.Wrapped

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> WrappedBifunctor p a b -> f (WrappedBifunctor p c d) #

Bitraversable ((,,,,) x y z)

Since: base-4.10.0.0

Instance details

Defined in Data.Bitraversable

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> (x, y, z, a, b) -> f (x, y, z, c, d) #

(Bitraversable f, Bitraversable g) => Bitraversable (Product f g) 
Instance details

Defined in Data.Bifunctor.Product

Methods

bitraverse :: Applicative f0 => (a -> f0 c) -> (b -> f0 d) -> Product f g a b -> f0 (Product f g c d) #

(Bitraversable p, Bitraversable q) => Bitraversable (Sum p q) 
Instance details

Defined in Data.Bifunctor.Sum

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> Sum p q a b -> f (Sum p q c d) #

Bitraversable ((,,,,,) x y z w)

Since: base-4.10.0.0

Instance details

Defined in Data.Bitraversable

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> (x, y, z, w, a, b) -> f (x, y, z, w, c, d) #

(Traversable f, Bitraversable p) => Bitraversable (Tannen f p) 
Instance details

Defined in Data.Bifunctor.Tannen

Methods

bitraverse :: Applicative f0 => (a -> f0 c) -> (b -> f0 d) -> Tannen f p a b -> f0 (Tannen f p c d) #

Bitraversable ((,,,,,,) x y z w v)

Since: base-4.10.0.0

Instance details

Defined in Data.Bitraversable

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> (x, y, z, w, v, a, b) -> f (x, y, z, w, v, c, d) #

(Bitraversable p, Traversable f, Traversable g) => Bitraversable (Biff p f g) 
Instance details

Defined in Data.Bifunctor.Biff

Methods

bitraverse :: Applicative f0 => (a -> f0 c) -> (b -> f0 d) -> Biff p f g a b -> f0 (Biff p f g c d) #

data Void #

Uninhabited data type

Since: base-4.8.0.0

Instances

Instances details
FromJSON Void 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Void

Since: aeson-2.1.2.0

Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Void 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Void

Since: aeson-2.1.2.0

Instance details

Defined in Data.Aeson.Types.ToJSON

Data Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Void -> c Void #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Void #

toConstr :: Void -> Constr #

dataTypeOf :: Void -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Void) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Void) #

gmapT :: (forall b. Data b => b -> b) -> Void -> Void #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Void -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Void -> r #

gmapQ :: (forall d. Data d => d -> u) -> Void -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Void -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Void -> m Void #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Void -> m Void #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Void -> m Void #

Semigroup Void

Since: base-4.9.0.0

Instance details

Defined in Data.Void

Methods

(<>) :: Void -> Void -> Void #

sconcat :: NonEmpty Void -> Void #

stimes :: Integral b => b -> Void -> Void #

Exception Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Generic Void 
Instance details

Defined in Data.Void

Associated Types

type Rep Void :: Type -> Type #

Methods

from :: Void -> Rep Void x #

to :: Rep Void x -> Void #

Ix Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Methods

range :: (Void, Void) -> [Void] #

index :: (Void, Void) -> Void -> Int #

unsafeIndex :: (Void, Void) -> Void -> Int #

inRange :: (Void, Void) -> Void -> Bool #

rangeSize :: (Void, Void) -> Int #

unsafeRangeSize :: (Void, Void) -> Int #

Read Void

Reading a Void value is always a parse error, considering Void as a data type with no constructors.

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Show Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Methods

showsPrec :: Int -> Void -> ShowS #

show :: Void -> String #

showList :: [Void] -> ShowS #

NFData Void

Defined as rnf = absurd.

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Void -> () #

Eq Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Methods

(==) :: Void -> Void -> Bool #

(/=) :: Void -> Void -> Bool #

Ord Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Methods

compare :: Void -> Void -> Ordering #

(<) :: Void -> Void -> Bool #

(<=) :: Void -> Void -> Bool #

(>) :: Void -> Void -> Bool #

(>=) :: Void -> Void -> Bool #

max :: Void -> Void -> Void #

min :: Void -> Void -> Void #

Hashable Void 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Void -> Int #

hash :: Void -> Int #

Pretty Void

Finding a good example for printing something that does not exist is hard, so here is an example of printing a list full of nothing.

>>> pretty ([] :: [Void])
[]
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Void -> Doc ann #

prettyList :: [Void] -> Doc ann #

Lift Void

Since: template-haskell-2.15.0.0

Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Void -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Void -> Code m Void #

type Rep Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

type Rep Void = D1 ('MetaData "Void" "Data.Void" "base" 'False) (V1 :: Type -> Type)

class (Alternative m, Monad m) => MonadPlus (m :: Type -> Type) where #

Monads that also support choice and failure.

Minimal complete definition

Nothing

Methods

mzero :: m a #

The identity of mplus. It should also satisfy the equations

mzero >>= f  =  mzero
v >> mzero   =  mzero

The default definition is

mzero = empty

mplus :: m a -> m a -> m a #

An associative operation. The default definition is

mplus = (<|>)

Instances

Instances details
MonadPlus IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

mzero :: IResult a #

mplus :: IResult a -> IResult a -> IResult a #

MonadPlus Parser 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

mzero :: Parser a #

mplus :: Parser a -> Parser a -> Parser a #

MonadPlus Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

mzero :: Result a #

mplus :: Result a -> Result a -> Result a #

MonadPlus STM

Since: base-4.3.0.0

Instance details

Defined in GHC.Conc.Sync

Methods

mzero :: STM a #

mplus :: STM a -> STM a -> STM a #

MonadPlus P

Since: base-2.1

Instance details

Defined in Text.ParserCombinators.ReadP

Methods

mzero :: P a #

mplus :: P a -> P a -> P a #

MonadPlus ReadP

Since: base-2.1

Instance details

Defined in Text.ParserCombinators.ReadP

Methods

mzero :: ReadP a #

mplus :: ReadP a -> ReadP a -> ReadP a #

MonadPlus Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

mzero :: Seq a #

mplus :: Seq a -> Seq a -> Seq a #

MonadPlus DList 
Instance details

Defined in Data.DList.Internal

Methods

mzero :: DList a #

mplus :: DList a -> DList a -> DList a #

MonadPlus IO

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

mzero :: IO a #

mplus :: IO a -> IO a -> IO a #

MonadPlus ReadM 
Instance details

Defined in Options.Applicative.Types

Methods

mzero :: ReadM a #

mplus :: ReadM a -> ReadM a -> ReadM a #

MonadPlus Array 
Instance details

Defined in Data.Primitive.Array

Methods

mzero :: Array a #

mplus :: Array a -> Array a -> Array a #

MonadPlus SmallArray 
Instance details

Defined in Data.Primitive.SmallArray

MonadPlus Vector 
Instance details

Defined in Data.Vector

Methods

mzero :: Vector a #

mplus :: Vector a -> Vector a -> Vector a #

MonadPlus Maybe

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

mzero :: Maybe a #

mplus :: Maybe a -> Maybe a -> Maybe a #

MonadPlus []

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

mzero :: [a] #

mplus :: [a] -> [a] -> [a] #

MonadPlus (Parser i) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

mzero :: Parser i a #

mplus :: Parser i a -> Parser i a -> Parser i a #

(ArrowApply a, ArrowPlus a) => MonadPlus (ArrowMonad a)

Since: base-4.6.0.0

Instance details

Defined in Control.Arrow

Methods

mzero :: ArrowMonad a a0 #

mplus :: ArrowMonad a a0 -> ArrowMonad a a0 -> ArrowMonad a a0 #

MonadPlus (Proxy :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Proxy

Methods

mzero :: Proxy a #

mplus :: Proxy a -> Proxy a -> Proxy a #

MonadPlus (U1 :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

mzero :: U1 a #

mplus :: U1 a -> U1 a -> U1 a #

MonadPlus v => MonadPlus (Free v)

This violates the MonadPlus laws, handle with care.

Instance details

Defined in Control.Monad.Free

Methods

mzero :: Free v a #

mplus :: Free v a -> Free v a -> Free v a #

MonadPlus m => MonadPlus (Yoneda m) 
Instance details

Defined in Data.Functor.Yoneda

Methods

mzero :: Yoneda m a #

mplus :: Yoneda m a -> Yoneda m a -> Yoneda m a #

MonadPlus (ReifiedFold s) 
Instance details

Defined in Control.Lens.Reified

Methods

mzero :: ReifiedFold s a #

mplus :: ReifiedFold s a -> ReifiedFold s a -> ReifiedFold s a #

MonadPlus m => MonadPlus (ResourceT m)

Since 1.1.5

Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

mzero :: ResourceT m a #

mplus :: ResourceT m a -> ResourceT m a -> ResourceT m a #

Monad m => MonadPlus (ListT m) 
Instance details

Defined in Control.Monad.Trans.List

Methods

mzero :: ListT m a #

mplus :: ListT m a -> ListT m a -> ListT m a #

Monad m => MonadPlus (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

mzero :: MaybeT m a #

mplus :: MaybeT m a -> MaybeT m a -> MaybeT m a #

MonadPlus m => MonadPlus (Kleisli m a)

Since: base-4.14.0.0

Instance details

Defined in Control.Arrow

Methods

mzero :: Kleisli m a a0 #

mplus :: Kleisli m a a0 -> Kleisli m a a0 -> Kleisli m a a0 #

MonadPlus f => MonadPlus (Ap f)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

mzero :: Ap f a #

mplus :: Ap f a -> Ap f a -> Ap f a #

MonadPlus f => MonadPlus (Alt f)

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

mzero :: Alt f a #

mplus :: Alt f a -> Alt f a -> Alt f a #

MonadPlus f => MonadPlus (Rec1 f)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

mzero :: Rec1 f a #

mplus :: Rec1 f a -> Rec1 f a -> Rec1 f a #

(Functor f, MonadPlus m) => MonadPlus (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

mzero :: FreeT f m a #

mplus :: FreeT f m a -> FreeT f m a -> FreeT f m a #

(Monoid w, Functor m, MonadPlus m) => MonadPlus (AccumT w m) 
Instance details

Defined in Control.Monad.Trans.Accum

Methods

mzero :: AccumT w m a #

mplus :: AccumT w m a -> AccumT w m a -> AccumT w m a #

(Monad m, Error e) => MonadPlus (ErrorT e m) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

mzero :: ErrorT e m a #

mplus :: ErrorT e m a -> ErrorT e m a -> ErrorT e m a #

(Monad m, Monoid e) => MonadPlus (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

mzero :: ExceptT e m a #

mplus :: ExceptT e m a -> ExceptT e m a -> ExceptT e m a #

MonadPlus m => MonadPlus (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

mzero :: IdentityT m a #

mplus :: IdentityT m a -> IdentityT m a -> IdentityT m a #

MonadPlus m => MonadPlus (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

mzero :: ReaderT r m a #

mplus :: ReaderT r m a -> ReaderT r m a -> ReaderT r m a #

MonadPlus m => MonadPlus (SelectT r m) 
Instance details

Defined in Control.Monad.Trans.Select

Methods

mzero :: SelectT r m a #

mplus :: SelectT r m a -> SelectT r m a -> SelectT r m a #

MonadPlus m => MonadPlus (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Lazy

Methods

mzero :: StateT s m a #

mplus :: StateT s m a -> StateT s m a -> StateT s m a #

MonadPlus m => MonadPlus (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

mzero :: StateT s m a #

mplus :: StateT s m a -> StateT s m a -> StateT s m a #

(Monoid w, MonadPlus m) => MonadPlus (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

mzero :: WriterT w m a #

mplus :: WriterT w m a -> WriterT w m a -> WriterT w m a #

(Monoid w, MonadPlus m) => MonadPlus (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

mzero :: WriterT w m a #

mplus :: WriterT w m a -> WriterT w m a -> WriterT w m a #

MonadPlus m => MonadPlus (Reverse m)

Derived instance.

Instance details

Defined in Data.Functor.Reverse

Methods

mzero :: Reverse m a #

mplus :: Reverse m a -> Reverse m a -> Reverse m a #

(MonadPlus f, MonadPlus g) => MonadPlus (Product f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Product

Methods

mzero :: Product f g a #

mplus :: Product f g a -> Product f g a -> Product f g a #

(MonadPlus f, MonadPlus g) => MonadPlus (f :*: g)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

mzero :: (f :*: g) a #

mplus :: (f :*: g) a -> (f :*: g) a -> (f :*: g) a #

MonadPlus f => MonadPlus (M1 i c f)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

mzero :: M1 i c f a #

mplus :: M1 i c f a -> M1 i c f a -> M1 i c f a #

(Monoid w, MonadPlus m) => MonadPlus (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.Lazy

Methods

mzero :: RWST r w s m a #

mplus :: RWST r w s m a -> RWST r w s m a -> RWST r w s m a #

(Monoid w, MonadPlus m) => MonadPlus (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.Strict

Methods

mzero :: RWST r w s m a #

mplus :: RWST r w s m a -> RWST r w s m a -> RWST r w s m a #

class Applicative f => Alternative (f :: Type -> Type) where #

A monoid on applicative functors.

If defined, some and many should be the least solutions of the equations:

Minimal complete definition

empty, (<|>)

Methods

(<|>) :: f a -> f a -> f a infixl 3 #

An associative binary operation

some :: f a -> f [a] #

One or more.

many :: f a -> f [a] #

Zero or more.

Instances

Instances details
Alternative IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

empty :: IResult a #

(<|>) :: IResult a -> IResult a -> IResult a #

some :: IResult a -> IResult [a] #

many :: IResult a -> IResult [a] #

Alternative Parser 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

empty :: Parser a #

(<|>) :: Parser a -> Parser a -> Parser a #

some :: Parser a -> Parser [a] #

many :: Parser a -> Parser [a] #

Alternative Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

empty :: Result a #

(<|>) :: Result a -> Result a -> Result a #

some :: Result a -> Result [a] #

many :: Result a -> Result [a] #

Alternative Concurrently 
Instance details

Defined in Control.Concurrent.Async

Alternative ZipList

Since: base-4.11.0.0

Instance details

Defined in Control.Applicative

Methods

empty :: ZipList a #

(<|>) :: ZipList a -> ZipList a -> ZipList a #

some :: ZipList a -> ZipList [a] #

many :: ZipList a -> ZipList [a] #

Alternative STM

Since: base-4.8.0.0

Instance details

Defined in GHC.Conc.Sync

Methods

empty :: STM a #

(<|>) :: STM a -> STM a -> STM a #

some :: STM a -> STM [a] #

many :: STM a -> STM [a] #

Alternative P

Since: base-4.5.0.0

Instance details

Defined in Text.ParserCombinators.ReadP

Methods

empty :: P a #

(<|>) :: P a -> P a -> P a #

some :: P a -> P [a] #

many :: P a -> P [a] #

Alternative ReadP

Since: base-4.6.0.0

Instance details

Defined in Text.ParserCombinators.ReadP

Methods

empty :: ReadP a #

(<|>) :: ReadP a -> ReadP a -> ReadP a #

some :: ReadP a -> ReadP [a] #

many :: ReadP a -> ReadP [a] #

Alternative Seq

Since: containers-0.5.4

Instance details

Defined in Data.Sequence.Internal

Methods

empty :: Seq a #

(<|>) :: Seq a -> Seq a -> Seq a #

some :: Seq a -> Seq [a] #

many :: Seq a -> Seq [a] #

Alternative DList 
Instance details

Defined in Data.DList.Internal

Methods

empty :: DList a #

(<|>) :: DList a -> DList a -> DList a #

some :: DList a -> DList [a] #

many :: DList a -> DList [a] #

Alternative IO

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

empty :: IO a #

(<|>) :: IO a -> IO a -> IO a #

some :: IO a -> IO [a] #

many :: IO a -> IO [a] #

Alternative Parser 
Instance details

Defined in Options.Applicative.Types

Methods

empty :: Parser a #

(<|>) :: Parser a -> Parser a -> Parser a #

some :: Parser a -> Parser [a] #

many :: Parser a -> Parser [a] #

Alternative ReadM 
Instance details

Defined in Options.Applicative.Types

Methods

empty :: ReadM a #

(<|>) :: ReadM a -> ReadM a -> ReadM a #

some :: ReadM a -> ReadM [a] #

many :: ReadM a -> ReadM [a] #

Alternative Array 
Instance details

Defined in Data.Primitive.Array

Methods

empty :: Array a #

(<|>) :: Array a -> Array a -> Array a #

some :: Array a -> Array [a] #

many :: Array a -> Array [a] #

Alternative SmallArray 
Instance details

Defined in Data.Primitive.SmallArray

Alternative Vector 
Instance details

Defined in Data.Vector

Methods

empty :: Vector a #

(<|>) :: Vector a -> Vector a -> Vector a #

some :: Vector a -> Vector [a] #

many :: Vector a -> Vector [a] #

Alternative Maybe

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

empty :: Maybe a #

(<|>) :: Maybe a -> Maybe a -> Maybe a #

some :: Maybe a -> Maybe [a] #

many :: Maybe a -> Maybe [a] #

Alternative []

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

empty :: [a] #

(<|>) :: [a] -> [a] -> [a] #

some :: [a] -> [[a]] #

many :: [a] -> [[a]] #

Alternative (Parser i) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

empty :: Parser i a #

(<|>) :: Parser i a -> Parser i a -> Parser i a #

some :: Parser i a -> Parser i [a] #

many :: Parser i a -> Parser i [a] #

MonadPlus m => Alternative (WrappedMonad m)

Since: base-2.1

Instance details

Defined in Control.Applicative

Methods

empty :: WrappedMonad m a #

(<|>) :: WrappedMonad m a -> WrappedMonad m a -> WrappedMonad m a #

some :: WrappedMonad m a -> WrappedMonad m [a] #

many :: WrappedMonad m a -> WrappedMonad m [a] #

ArrowPlus a => Alternative (ArrowMonad a)

Since: base-4.6.0.0

Instance details

Defined in Control.Arrow

Methods

empty :: ArrowMonad a a0 #

(<|>) :: ArrowMonad a a0 -> ArrowMonad a a0 -> ArrowMonad a a0 #

some :: ArrowMonad a a0 -> ArrowMonad a [a0] #

many :: ArrowMonad a a0 -> ArrowMonad a [a0] #

Alternative (Proxy :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Proxy

Methods

empty :: Proxy a #

(<|>) :: Proxy a -> Proxy a -> Proxy a #

some :: Proxy a -> Proxy [a] #

many :: Proxy a -> Proxy [a] #

Alternative (U1 :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

empty :: U1 a #

(<|>) :: U1 a -> U1 a -> U1 a #

some :: U1 a -> U1 [a] #

many :: U1 a -> U1 [a] #

Alternative (Parser e) 
Instance details

Defined in Env.Internal.Parser

Methods

empty :: Parser e a #

(<|>) :: Parser e a -> Parser e a -> Parser e a #

some :: Parser e a -> Parser e [a] #

many :: Parser e a -> Parser e [a] #

Alternative v => Alternative (Free v)

This violates the Alternative laws, handle with care.

Instance details

Defined in Control.Monad.Free

Methods

empty :: Free v a #

(<|>) :: Free v a -> Free v a -> Free v a #

some :: Free v a -> Free v [a] #

many :: Free v a -> Free v [a] #

Alternative f => Alternative (Yoneda f) 
Instance details

Defined in Data.Functor.Yoneda

Methods

empty :: Yoneda f a #

(<|>) :: Yoneda f a -> Yoneda f a -> Yoneda f a #

some :: Yoneda f a -> Yoneda f [a] #

many :: Yoneda f a -> Yoneda f [a] #

Alternative (ReifiedFold s) 
Instance details

Defined in Control.Lens.Reified

Methods

empty :: ReifiedFold s a #

(<|>) :: ReifiedFold s a -> ReifiedFold s a -> ReifiedFold s a #

some :: ReifiedFold s a -> ReifiedFold s [a] #

many :: ReifiedFold s a -> ReifiedFold s [a] #

Alternative m => Alternative (LoggingT m)

Since: monad-logger-0.3.40

Instance details

Defined in Control.Monad.Logger

Methods

empty :: LoggingT m a #

(<|>) :: LoggingT m a -> LoggingT m a -> LoggingT m a #

some :: LoggingT m a -> LoggingT m [a] #

many :: LoggingT m a -> LoggingT m [a] #

Alternative m => Alternative (NoLoggingT m)

Since: monad-logger-0.3.40

Instance details

Defined in Control.Monad.Logger

Methods

empty :: NoLoggingT m a #

(<|>) :: NoLoggingT m a -> NoLoggingT m a -> NoLoggingT m a #

some :: NoLoggingT m a -> NoLoggingT m [a] #

many :: NoLoggingT m a -> NoLoggingT m [a] #

Alternative m => Alternative (ResourceT m)

Since 1.1.5

Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

empty :: ResourceT m a #

(<|>) :: ResourceT m a -> ResourceT m a -> ResourceT m a #

some :: ResourceT m a -> ResourceT m [a] #

many :: ResourceT m a -> ResourceT m [a] #

Alternative f => Alternative (Lift f)

A combination is Pure only either part is.

Instance details

Defined in Control.Applicative.Lift

Methods

empty :: Lift f a #

(<|>) :: Lift f a -> Lift f a -> Lift f a #

some :: Lift f a -> Lift f [a] #

many :: Lift f a -> Lift f [a] #

Applicative m => Alternative (ListT m) 
Instance details

Defined in Control.Monad.Trans.List

Methods

empty :: ListT m a #

(<|>) :: ListT m a -> ListT m a -> ListT m a #

some :: ListT m a -> ListT m [a] #

many :: ListT m a -> ListT m [a] #

(Functor m, Monad m) => Alternative (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

empty :: MaybeT m a #

(<|>) :: MaybeT m a -> MaybeT m a -> MaybeT m a #

some :: MaybeT m a -> MaybeT m [a] #

many :: MaybeT m a -> MaybeT m [a] #

MonadUnliftIO m => Alternative (Conc m)

Since: unliftio-0.2.9.0

Instance details

Defined in UnliftIO.Internals.Async

Methods

empty :: Conc m a #

(<|>) :: Conc m a -> Conc m a -> Conc m a #

some :: Conc m a -> Conc m [a] #

many :: Conc m a -> Conc m [a] #

MonadUnliftIO m => Alternative (Concurrently m)

Composing two unlifted Concurrently values using Alternative is the equivalent to using a race combinator, the asynchrounous sub-routine that returns a value first is the one that gets it's value returned, the slowest sub-routine gets cancelled and it's thread is killed.

Since: unliftio-0.1.0.0

Instance details

Defined in UnliftIO.Internals.Async

Methods

empty :: Concurrently m a #

(<|>) :: Concurrently m a -> Concurrently m a -> Concurrently m a #

some :: Concurrently m a -> Concurrently m [a] #

many :: Concurrently m a -> Concurrently m [a] #

(ArrowZero a, ArrowPlus a) => Alternative (WrappedArrow a b)

Since: base-2.1

Instance details

Defined in Control.Applicative

Methods

empty :: WrappedArrow a b a0 #

(<|>) :: WrappedArrow a b a0 -> WrappedArrow a b a0 -> WrappedArrow a b a0 #

some :: WrappedArrow a b a0 -> WrappedArrow a b [a0] #

many :: WrappedArrow a b a0 -> WrappedArrow a b [a0] #

Alternative m => Alternative (Kleisli m a)

Since: base-4.14.0.0

Instance details

Defined in Control.Arrow

Methods

empty :: Kleisli m a a0 #

(<|>) :: Kleisli m a a0 -> Kleisli m a a0 -> Kleisli m a a0 #

some :: Kleisli m a a0 -> Kleisli m a [a0] #

many :: Kleisli m a a0 -> Kleisli m a [a0] #

Alternative f => Alternative (Ap f)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

empty :: Ap f a #

(<|>) :: Ap f a -> Ap f a -> Ap f a #

some :: Ap f a -> Ap f [a] #

many :: Ap f a -> Ap f [a] #

Alternative f => Alternative (Alt f)

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

empty :: Alt f a #

(<|>) :: Alt f a -> Alt f a -> Alt f a #

some :: Alt f a -> Alt f [a] #

many :: Alt f a -> Alt f [a] #

Alternative f => Alternative (Rec1 f)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

empty :: Rec1 f a #

(<|>) :: Rec1 f a -> Rec1 f a -> Rec1 f a #

some :: Rec1 f a -> Rec1 f [a] #

many :: Rec1 f a -> Rec1 f [a] #

(Functor f, MonadPlus m) => Alternative (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

empty :: FreeT f m a #

(<|>) :: FreeT f m a -> FreeT f m a -> FreeT f m a #

some :: FreeT f m a -> FreeT f m [a] #

many :: FreeT f m a -> FreeT f m [a] #

Alternative f => Alternative (Backwards f)

Try alternatives in the same order as f.

Instance details

Defined in Control.Applicative.Backwards

Methods

empty :: Backwards f a #

(<|>) :: Backwards f a -> Backwards f a -> Backwards f a #

some :: Backwards f a -> Backwards f [a] #

many :: Backwards f a -> Backwards f [a] #

(Monoid w, Functor m, MonadPlus m) => Alternative (AccumT w m) 
Instance details

Defined in Control.Monad.Trans.Accum

Methods

empty :: AccumT w m a #

(<|>) :: AccumT w m a -> AccumT w m a -> AccumT w m a #

some :: AccumT w m a -> AccumT w m [a] #

many :: AccumT w m a -> AccumT w m [a] #

(Functor m, Monad m, Error e) => Alternative (ErrorT e m) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

empty :: ErrorT e m a #

(<|>) :: ErrorT e m a -> ErrorT e m a -> ErrorT e m a #

some :: ErrorT e m a -> ErrorT e m [a] #

many :: ErrorT e m a -> ErrorT e m [a] #

(Functor m, Monad m, Monoid e) => Alternative (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

empty :: ExceptT e m a #

(<|>) :: ExceptT e m a -> ExceptT e m a -> ExceptT e m a #

some :: ExceptT e m a -> ExceptT e m [a] #

many :: ExceptT e m a -> ExceptT e m [a] #

Alternative m => Alternative (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

empty :: IdentityT m a #

(<|>) :: IdentityT m a -> IdentityT m a -> IdentityT m a #

some :: IdentityT m a -> IdentityT m [a] #

many :: IdentityT m a -> IdentityT m [a] #

Alternative m => Alternative (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

empty :: ReaderT r m a #

(<|>) :: ReaderT r m a -> ReaderT r m a -> ReaderT r m a #

some :: ReaderT r m a -> ReaderT r m [a] #

many :: ReaderT r m a -> ReaderT r m [a] #

(Functor m, MonadPlus m) => Alternative (SelectT r m) 
Instance details

Defined in Control.Monad.Trans.Select

Methods

empty :: SelectT r m a #

(<|>) :: SelectT r m a -> SelectT r m a -> SelectT r m a #

some :: SelectT r m a -> SelectT r m [a] #

many :: SelectT r m a -> SelectT r m [a] #

(Functor m, MonadPlus m) => Alternative (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Lazy

Methods

empty :: StateT s m a #

(<|>) :: StateT s m a -> StateT s m a -> StateT s m a #

some :: StateT s m a -> StateT s m [a] #

many :: StateT s m a -> StateT s m [a] #

(Functor m, MonadPlus m) => Alternative (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

empty :: StateT s m a #

(<|>) :: StateT s m a -> StateT s m a -> StateT s m a #

some :: StateT s m a -> StateT s m [a] #

many :: StateT s m a -> StateT s m [a] #

(Monoid w, Alternative m) => Alternative (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

empty :: WriterT w m a #

(<|>) :: WriterT w m a -> WriterT w m a -> WriterT w m a #

some :: WriterT w m a -> WriterT w m [a] #

many :: WriterT w m a -> WriterT w m [a] #

(Monoid w, Alternative m) => Alternative (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

empty :: WriterT w m a #

(<|>) :: WriterT w m a -> WriterT w m a -> WriterT w m a #

some :: WriterT w m a -> WriterT w m [a] #

many :: WriterT w m a -> WriterT w m [a] #

Alternative f => Alternative (Reverse f)

Derived instance.

Instance details

Defined in Data.Functor.Reverse

Methods

empty :: Reverse f a #

(<|>) :: Reverse f a -> Reverse f a -> Reverse f a #

some :: Reverse f a -> Reverse f [a] #

many :: Reverse f a -> Reverse f [a] #

(Alternative f, Alternative g) => Alternative (Product f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Product

Methods

empty :: Product f g a #

(<|>) :: Product f g a -> Product f g a -> Product f g a #

some :: Product f g a -> Product f g [a] #

many :: Product f g a -> Product f g [a] #

(Alternative f, Alternative g) => Alternative (f :*: g)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

empty :: (f :*: g) a #

(<|>) :: (f :*: g) a -> (f :*: g) a -> (f :*: g) a #

some :: (f :*: g) a -> (f :*: g) [a] #

many :: (f :*: g) a -> (f :*: g) [a] #

(Alternative f, Applicative g) => Alternative (Compose f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

empty :: Compose f g a #

(<|>) :: Compose f g a -> Compose f g a -> Compose f g a #

some :: Compose f g a -> Compose f g [a] #

many :: Compose f g a -> Compose f g [a] #

(Alternative f, Applicative g) => Alternative (f :.: g)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

empty :: (f :.: g) a #

(<|>) :: (f :.: g) a -> (f :.: g) a -> (f :.: g) a #

some :: (f :.: g) a -> (f :.: g) [a] #

many :: (f :.: g) a -> (f :.: g) [a] #

Alternative f => Alternative (M1 i c f)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

empty :: M1 i c f a #

(<|>) :: M1 i c f a -> M1 i c f a -> M1 i c f a #

some :: M1 i c f a -> M1 i c f [a] #

many :: M1 i c f a -> M1 i c f [a] #

(Monoid w, Functor m, MonadPlus m) => Alternative (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.Lazy

Methods

empty :: RWST r w s m a #

(<|>) :: RWST r w s m a -> RWST r w s m a -> RWST r w s m a #

some :: RWST r w s m a -> RWST r w s m [a] #

many :: RWST r w s m a -> RWST r w s m [a] #

(Monoid w, Functor m, MonadPlus m) => Alternative (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.Strict

Methods

empty :: RWST r w s m a #

(<|>) :: RWST r w s m a -> RWST r w s m a -> RWST r w s m a #

some :: RWST r w s m a -> RWST r w s m [a] #

many :: RWST r w s m a -> RWST r w s m [a] #

mapM_ :: (Foldable t, Monad m) => (a -> m b) -> t a -> m () #

Map each element of a structure to a monadic action, evaluate these actions from left to right, and ignore the results. For a version that doesn't ignore the results see mapM.

mapM_ is just like traverse_, but specialised to monadic actions.

forM_ :: (Foldable t, Monad m) => t a -> (a -> m b) -> m () #

forM_ is mapM_ with its arguments flipped. For a version that doesn't ignore the results see forM.

forM_ is just like for_, but specialised to monadic actions.

class Bifunctor (p :: Type -> Type -> Type) where #

A bifunctor is a type constructor that takes two type arguments and is a functor in both arguments. That is, unlike with Functor, a type constructor such as Either does not need to be partially applied for a Bifunctor instance, and the methods in this class permit mapping functions over the Left value or the Right value, or both at the same time.

Formally, the class Bifunctor represents a bifunctor from Hask -> Hask.

Intuitively it is a bifunctor where both the first and second arguments are covariant.

You can define a Bifunctor by either defining bimap or by defining both first and second.

If you supply bimap, you should ensure that:

bimap id idid

If you supply first and second, ensure:

first idid
second idid

If you supply both, you should also ensure:

bimap f g ≡ first f . second g

These ensure by parametricity:

bimap  (f . g) (h . i) ≡ bimap f h . bimap g i
first  (f . g) ≡ first  f . first  g
second (f . g) ≡ second f . second g

Since: base-4.8.0.0

Minimal complete definition

bimap | first, second

Methods

bimap :: (a -> b) -> (c -> d) -> p a c -> p b d #

Map over both arguments at the same time.

bimap f g ≡ first f . second g

Examples

Expand
>>> bimap toUpper (+1) ('j', 3)
('J',4)
>>> bimap toUpper (+1) (Left 'j')
Left 'J'
>>> bimap toUpper (+1) (Right 3)
Right 4

first :: (a -> b) -> p a c -> p b c #

Map covariantly over the first argument.

first f ≡ bimap f id

Examples

Expand
>>> first toUpper ('j', 3)
('J',3)
>>> first toUpper (Left 'j')
Left 'J'

second :: (b -> c) -> p a b -> p a c #

Map covariantly over the second argument.

secondbimap id

Examples

Expand
>>> second (+1) ('j', 3)
('j',4)
>>> second (+1) (Right 3)
Right 4

Instances

Instances details
Bifunctor Either

Since: base-4.8.0.0

Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> Either a c -> Either b d #

first :: (a -> b) -> Either a c -> Either b c #

second :: (b -> c) -> Either a b -> Either a c #

Bifunctor Arg

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

bimap :: (a -> b) -> (c -> d) -> Arg a c -> Arg b d #

first :: (a -> b) -> Arg a c -> Arg b c #

second :: (b -> c) -> Arg a b -> Arg a c #

Bifunctor Either 
Instance details

Defined in Data.Strict.Either

Methods

bimap :: (a -> b) -> (c -> d) -> Either a c -> Either b d #

first :: (a -> b) -> Either a c -> Either b c #

second :: (b -> c) -> Either a b -> Either a c #

Bifunctor These 
Instance details

Defined in Data.Strict.These

Methods

bimap :: (a -> b) -> (c -> d) -> These a c -> These b d #

first :: (a -> b) -> These a c -> These b c #

second :: (b -> c) -> These a b -> These a c #

Bifunctor Pair 
Instance details

Defined in Data.Strict.Tuple

Methods

bimap :: (a -> b) -> (c -> d) -> Pair a c -> Pair b d #

first :: (a -> b) -> Pair a c -> Pair b c #

second :: (b -> c) -> Pair a b -> Pair a c #

Bifunctor These 
Instance details

Defined in Data.These

Methods

bimap :: (a -> b) -> (c -> d) -> These a c -> These b d #

first :: (a -> b) -> These a c -> These b c #

second :: (b -> c) -> These a b -> These a c #

Bifunctor (,)

Since: base-4.8.0.0

Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> (a, c) -> (b, d) #

first :: (a -> b) -> (a, c) -> (b, c) #

second :: (b -> c) -> (a, b) -> (a, c) #

Bifunctor (Const :: Type -> Type -> Type)

Since: base-4.8.0.0

Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> Const a c -> Const b d #

first :: (a -> b) -> Const a c -> Const b c #

second :: (b -> c) -> Const a b -> Const a c #

Functor f => Bifunctor (CofreeF f) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

bimap :: (a -> b) -> (c -> d) -> CofreeF f a c -> CofreeF f b d #

first :: (a -> b) -> CofreeF f a c -> CofreeF f b c #

second :: (b -> c) -> CofreeF f a b -> CofreeF f a c #

Functor f => Bifunctor (FreeF f) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

bimap :: (a -> b) -> (c -> d) -> FreeF f a c -> FreeF f b d #

first :: (a -> b) -> FreeF f a c -> FreeF f b c #

second :: (b -> c) -> FreeF f a b -> FreeF f a c #

Bifunctor (Tagged :: Type -> Type -> Type) 
Instance details

Defined in Data.Tagged

Methods

bimap :: (a -> b) -> (c -> d) -> Tagged a c -> Tagged b d #

first :: (a -> b) -> Tagged a c -> Tagged b c #

second :: (b -> c) -> Tagged a b -> Tagged a c #

Bifunctor (Constant :: Type -> Type -> Type) 
Instance details

Defined in Data.Functor.Constant

Methods

bimap :: (a -> b) -> (c -> d) -> Constant a c -> Constant b d #

first :: (a -> b) -> Constant a c -> Constant b c #

second :: (b -> c) -> Constant a b -> Constant a c #

Bifunctor ((,,) x1)

Since: base-4.8.0.0

Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> (x1, a, c) -> (x1, b, d) #

first :: (a -> b) -> (x1, a, c) -> (x1, b, c) #

second :: (b -> c) -> (x1, a, b) -> (x1, a, c) #

Bifunctor (K1 i :: Type -> Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> K1 i a c -> K1 i b d #

first :: (a -> b) -> K1 i a c -> K1 i b c #

second :: (b -> c) -> K1 i a b -> K1 i a c #

Bifunctor ((,,,) x1 x2)

Since: base-4.8.0.0

Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> (x1, x2, a, c) -> (x1, x2, b, d) #

first :: (a -> b) -> (x1, x2, a, c) -> (x1, x2, b, c) #

second :: (b -> c) -> (x1, x2, a, b) -> (x1, x2, a, c) #

Functor f => Bifunctor (Clown f :: Type -> Type -> Type) 
Instance details

Defined in Data.Bifunctor.Clown

Methods

bimap :: (a -> b) -> (c -> d) -> Clown f a c -> Clown f b d #

first :: (a -> b) -> Clown f a c -> Clown f b c #

second :: (b -> c) -> Clown f a b -> Clown f a c #

Bifunctor p => Bifunctor (Flip p) 
Instance details

Defined in Data.Bifunctor.Flip

Methods

bimap :: (a -> b) -> (c -> d) -> Flip p a c -> Flip p b d #

first :: (a -> b) -> Flip p a c -> Flip p b c #

second :: (b -> c) -> Flip p a b -> Flip p a c #

Functor g => Bifunctor (Joker g :: Type -> Type -> Type) 
Instance details

Defined in Data.Bifunctor.Joker

Methods

bimap :: (a -> b) -> (c -> d) -> Joker g a c -> Joker g b d #

first :: (a -> b) -> Joker g a c -> Joker g b c #

second :: (b -> c) -> Joker g a b -> Joker g a c #

Bifunctor p => Bifunctor (WrappedBifunctor p) 
Instance details

Defined in Data.Bifunctor.Wrapped

Methods

bimap :: (a -> b) -> (c -> d) -> WrappedBifunctor p a c -> WrappedBifunctor p b d #

first :: (a -> b) -> WrappedBifunctor p a c -> WrappedBifunctor p b c #

second :: (b -> c) -> WrappedBifunctor p a b -> WrappedBifunctor p a c #

Bifunctor ((,,,,) x1 x2 x3)

Since: base-4.8.0.0

Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> (x1, x2, x3, a, c) -> (x1, x2, x3, b, d) #

first :: (a -> b) -> (x1, x2, x3, a, c) -> (x1, x2, x3, b, c) #

second :: (b -> c) -> (x1, x2, x3, a, b) -> (x1, x2, x3, a, c) #

(Bifunctor f, Bifunctor g) => Bifunctor (Product f g) 
Instance details

Defined in Data.Bifunctor.Product

Methods

bimap :: (a -> b) -> (c -> d) -> Product f g a c -> Product f g b d #

first :: (a -> b) -> Product f g a c -> Product f g b c #

second :: (b -> c) -> Product f g a b -> Product f g a c #

(Bifunctor p, Bifunctor q) => Bifunctor (Sum p q) 
Instance details

Defined in Data.Bifunctor.Sum

Methods

bimap :: (a -> b) -> (c -> d) -> Sum p q a c -> Sum p q b d #

first :: (a -> b) -> Sum p q a c -> Sum p q b c #

second :: (b -> c) -> Sum p q a b -> Sum p q a c #

Bifunctor ((,,,,,) x1 x2 x3 x4)

Since: base-4.8.0.0

Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> (x1, x2, x3, x4, a, c) -> (x1, x2, x3, x4, b, d) #

first :: (a -> b) -> (x1, x2, x3, x4, a, c) -> (x1, x2, x3, x4, b, c) #

second :: (b -> c) -> (x1, x2, x3, x4, a, b) -> (x1, x2, x3, x4, a, c) #

(Functor f, Bifunctor p) => Bifunctor (Tannen f p) 
Instance details

Defined in Data.Bifunctor.Tannen

Methods

bimap :: (a -> b) -> (c -> d) -> Tannen f p a c -> Tannen f p b d #

first :: (a -> b) -> Tannen f p a c -> Tannen f p b c #

second :: (b -> c) -> Tannen f p a b -> Tannen f p a c #

Bifunctor ((,,,,,,) x1 x2 x3 x4 x5)

Since: base-4.8.0.0

Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> (x1, x2, x3, x4, x5, a, c) -> (x1, x2, x3, x4, x5, b, d) #

first :: (a -> b) -> (x1, x2, x3, x4, x5, a, c) -> (x1, x2, x3, x4, x5, b, c) #

second :: (b -> c) -> (x1, x2, x3, x4, x5, a, b) -> (x1, x2, x3, x4, x5, a, c) #

(Bifunctor p, Functor f, Functor g) => Bifunctor (Biff p f g) 
Instance details

Defined in Data.Bifunctor.Biff

Methods

bimap :: (a -> b) -> (c -> d) -> Biff p f g a c -> Biff p f g b d #

first :: (a -> b) -> Biff p f g a c -> Biff p f g b c #

second :: (b -> c) -> Biff p f g a b -> Biff p f g a c #

data ThreadId #

A ThreadId is an abstract type representing a handle to a thread. ThreadId is an instance of Eq, Ord and Show, where the Ord instance implements an arbitrary total ordering over ThreadIds. The Show instance lets you convert an arbitrary-valued ThreadId to string form; showing a ThreadId value is occasionally useful when debugging or diagnosing the behaviour of a concurrent program.

Note: in GHC, if you have a ThreadId, you essentially have a pointer to the thread itself. This means the thread itself can't be garbage collected until you drop the ThreadId. This misfeature will hopefully be corrected at a later date.

Instances

Instances details
Show ThreadId

Since: base-4.2.0.0

Instance details

Defined in GHC.Conc.Sync

NFData ThreadId

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: ThreadId -> () #

Eq ThreadId

Since: base-4.2.0.0

Instance details

Defined in GHC.Conc.Sync

Ord ThreadId

Since: base-4.2.0.0

Instance details

Defined in GHC.Conc.Sync

Hashable ThreadId 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> ThreadId -> Int #

hash :: ThreadId -> Int #

waitBothSTM :: Async a -> Async b -> STM (a, b) #

A version of waitBoth that can be used inside an STM transaction.

Since: async-2.1.0

waitEitherSTM_ :: Async a -> Async b -> STM () #

A version of waitEither_ that can be used inside an STM transaction.

Since: async-2.1.0

waitEitherSTM :: Async a -> Async b -> STM (Either a b) #

A version of waitEither that can be used inside an STM transaction.

Since: async-2.1.0

waitEitherCatchSTM :: Async a -> Async b -> STM (Either (Either SomeException a) (Either SomeException b)) #

A version of waitEitherCatch that can be used inside an STM transaction.

Since: async-2.1.0

waitAnySTM :: [Async a] -> STM (Async a, a) #

A version of waitAny that can be used inside an STM transaction.

Since: async-2.1.0

waitAnyCatchSTM :: [Async a] -> STM (Async a, Either SomeException a) #

A version of waitAnyCatch that can be used inside an STM transaction.

Since: async-2.1.0

pollSTM :: Async a -> STM (Maybe (Either SomeException a)) #

A version of poll that can be used inside an STM transaction.

waitCatchSTM :: Async a -> STM (Either SomeException a) #

A version of waitCatch that can be used inside an STM transaction.

waitSTM :: Async a -> STM a #

A version of wait that can be used inside an STM transaction.

data Async a #

An asynchronous action spawned by async or withAsync. Asynchronous actions are executed in a separate thread, and operations are provided for waiting for asynchronous actions to complete and obtaining their results (see e.g. wait).

Instances

Instances details
Functor Async 
Instance details

Defined in Control.Concurrent.Async

Methods

fmap :: (a -> b) -> Async a -> Async b #

(<$) :: a -> Async b -> Async a #

Eq (Async a) 
Instance details

Defined in Control.Concurrent.Async

Methods

(==) :: Async a -> Async a -> Bool #

(/=) :: Async a -> Async a -> Bool #

Ord (Async a) 
Instance details

Defined in Control.Concurrent.Async

Methods

compare :: Async a -> Async a -> Ordering #

(<) :: Async a -> Async a -> Bool #

(<=) :: Async a -> Async a -> Bool #

(>) :: Async a -> Async a -> Bool #

(>=) :: Async a -> Async a -> Bool #

max :: Async a -> Async a -> Async a #

min :: Async a -> Async a -> Async a #

Hashable (Async a) 
Instance details

Defined in Control.Concurrent.Async

Methods

hashWithSalt :: Int -> Async a -> Int #

hash :: Async a -> Int #

data AsyncCancelled #

The exception thrown by cancel to terminate a thread.

Constructors

AsyncCancelled 

absurd :: Void -> a #

Since Void values logically don't exist, this witnesses the logical reasoning tool of "ex falso quodlibet".

>>> let x :: Either Void Int; x = Right 5
>>> :{
case x of
    Right r -> r
    Left l  -> absurd l
:}
5

Since: base-4.8.0.0

data Chan a #

Chan is an abstract type representing an unbounded FIFO channel.

Instances

Instances details
Eq (Chan a)

Since: base-4.4.0.0

Instance details

Defined in Control.Concurrent.Chan

Methods

(==) :: Chan a -> Chan a -> Bool #

(/=) :: Chan a -> Chan a -> Bool #

data QSem #

QSem is a quantity semaphore in which the resource is acquired and released in units of one. It provides guaranteed FIFO ordering for satisfying blocked waitQSem calls.

The pattern

  bracket_ waitQSem signalQSem (...)

is safe; it never loses a unit of the resource.

data QSemN #

QSemN is a quantity semaphore in which the resource is acquired and released in units of one. It provides guaranteed FIFO ordering for satisfying blocked waitQSemN calls.

The pattern

  bracket_ (waitQSemN n) (signalQSemN n) (...)

is safe; it never loses any of the resource.

for :: (Traversable t, Applicative f) => t a -> (a -> f b) -> f (t b) #

for is traverse with its arguments flipped. For a version that ignores the results see for_.

optional :: Alternative f => f a -> f (Maybe a) #

One or none.

It is useful for modelling any computation that is allowed to fail.

Examples

Expand

Using the Alternative instance of Control.Monad.Except, the following functions:

>>> import Control.Monad.Except
>>> canFail = throwError "it failed" :: Except String Int
>>> final = return 42                :: Except String Int

Can be combined by allowing the first function to fail:

>>> runExcept $ canFail *> final
Left "it failed"
>>> runExcept $ optional canFail *> final
Right 42

class Category a => Arrow (a :: TYPE LiftedRep -> TYPE LiftedRep -> Type) where #

The basic arrow class.

Instances should satisfy the following laws:

where

assoc ((a,b),c) = (a,(b,c))

The other combinators have sensible default definitions, which may be overridden for efficiency.

Minimal complete definition

arr, (first | (***))

Methods

(***) :: a b c -> a b' c' -> a (b, b') (c, c') infixr 3 #

Split the input between the two argument arrows and combine their output. Note that this is in general not a functor.

The default definition may be overridden with a more efficient version if desired.

(&&&) :: a b c -> a b c' -> a b (c, c') infixr 3 #

Fanout: send the input to both argument arrows and combine their output.

The default definition may be overridden with a more efficient version if desired.

Instances

Instances details
Arrow ReifiedFold 
Instance details

Defined in Control.Lens.Reified

Methods

arr :: (b -> c) -> ReifiedFold b c #

first :: ReifiedFold b c -> ReifiedFold (b, d) (c, d) #

second :: ReifiedFold b c -> ReifiedFold (d, b) (d, c) #

(***) :: ReifiedFold b c -> ReifiedFold b' c' -> ReifiedFold (b, b') (c, c') #

(&&&) :: ReifiedFold b c -> ReifiedFold b c' -> ReifiedFold b (c, c') #

Arrow ReifiedGetter 
Instance details

Defined in Control.Lens.Reified

Methods

arr :: (b -> c) -> ReifiedGetter b c #

first :: ReifiedGetter b c -> ReifiedGetter (b, d) (c, d) #

second :: ReifiedGetter b c -> ReifiedGetter (d, b) (d, c) #

(***) :: ReifiedGetter b c -> ReifiedGetter b' c' -> ReifiedGetter (b, b') (c, c') #

(&&&) :: ReifiedGetter b c -> ReifiedGetter b c' -> ReifiedGetter b (c, c') #

Monad m => Arrow (Kleisli m)

Since: base-2.1

Instance details

Defined in Control.Arrow

Methods

arr :: (b -> c) -> Kleisli m b c #

first :: Kleisli m b c -> Kleisli m (b, d) (c, d) #

second :: Kleisli m b c -> Kleisli m (d, b) (d, c) #

(***) :: Kleisli m b c -> Kleisli m b' c' -> Kleisli m (b, b') (c, c') #

(&&&) :: Kleisli m b c -> Kleisli m b c' -> Kleisli m b (c, c') #

Arrow (Indexed i) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

arr :: (b -> c) -> Indexed i b c #

first :: Indexed i b c -> Indexed i (b, d) (c, d) #

second :: Indexed i b c -> Indexed i (d, b) (d, c) #

(***) :: Indexed i b c -> Indexed i b' c' -> Indexed i (b, b') (c, c') #

(&&&) :: Indexed i b c -> Indexed i b c' -> Indexed i b (c, c') #

Arrow (->)

Since: base-2.1

Instance details

Defined in Control.Arrow

Methods

arr :: (b -> c) -> b -> c #

first :: (b -> c) -> (b, d) -> (c, d) #

second :: (b -> c) -> (d, b) -> (d, c) #

(***) :: (b -> c) -> (b' -> c') -> (b, b') -> (c, c') #

(&&&) :: (b -> c) -> (b -> c') -> b -> (c, c') #

(Arrow p, Arrow q) => Arrow (Product p q) 
Instance details

Defined in Data.Bifunctor.Product

Methods

arr :: (b -> c) -> Product p q b c #

first :: Product p q b c -> Product p q (b, d) (c, d) #

second :: Product p q b c -> Product p q (d, b) (d, c) #

(***) :: Product p q b c -> Product p q b' c' -> Product p q (b, b') (c, c') #

(&&&) :: Product p q b c -> Product p q b c' -> Product p q b (c, c') #

(Applicative f, Arrow p) => Arrow (Tannen f p) 
Instance details

Defined in Data.Bifunctor.Tannen

Methods

arr :: (b -> c) -> Tannen f p b c #

first :: Tannen f p b c -> Tannen f p (b, d) (c, d) #

second :: Tannen f p b c -> Tannen f p (d, b) (d, c) #

(***) :: Tannen f p b c -> Tannen f p b' c' -> Tannen f p (b, b') (c, c') #

(&&&) :: Tannen f p b c -> Tannen f p b c' -> Tannen f p b (c, c') #

data TVar a #

Shared memory locations that support atomic memory transactions.

Instances

Instances details
Eq (TVar a)

Since: base-4.8.0.0

Instance details

Defined in GHC.Conc.Sync

Methods

(==) :: TVar a -> TVar a -> Bool #

(/=) :: TVar a -> TVar a -> Bool #

data STM a #

A monad supporting atomic memory transactions.

Instances

Instances details
Alternative STM

Since: base-4.8.0.0

Instance details

Defined in GHC.Conc.Sync

Methods

empty :: STM a #

(<|>) :: STM a -> STM a -> STM a #

some :: STM a -> STM [a] #

many :: STM a -> STM [a] #

Applicative STM

Since: base-4.8.0.0

Instance details

Defined in GHC.Conc.Sync

Methods

pure :: a -> STM a #

(<*>) :: STM (a -> b) -> STM a -> STM b #

liftA2 :: (a -> b -> c) -> STM a -> STM b -> STM c #

(*>) :: STM a -> STM b -> STM b #

(<*) :: STM a -> STM b -> STM a #

Functor STM

Since: base-4.3.0.0

Instance details

Defined in GHC.Conc.Sync

Methods

fmap :: (a -> b) -> STM a -> STM b #

(<$) :: a -> STM b -> STM a #

Monad STM

Since: base-4.3.0.0

Instance details

Defined in GHC.Conc.Sync

Methods

(>>=) :: STM a -> (a -> STM b) -> STM b #

(>>) :: STM a -> STM b -> STM b #

return :: a -> STM a #

MonadPlus STM

Since: base-4.3.0.0

Instance details

Defined in GHC.Conc.Sync

Methods

mzero :: STM a #

mplus :: STM a -> STM a -> STM a #

MonadCatch STM 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => STM a -> (e -> STM a) -> STM a #

MonadThrow STM 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> STM a #

MonadBaseControl STM STM 
Instance details

Defined in Control.Monad.Trans.Control

Associated Types

type StM STM a #

Methods

liftBaseWith :: (RunInBase STM STM -> STM a) -> STM a #

restoreM :: StM STM a -> STM a #

RandomGen g => FrozenGen (TGen g) STM

Since: random-1.2.1

Instance details

Defined in System.Random.Stateful

Associated Types

type MutableGen (TGen g) STM = (g :: Type) #

Methods

freezeGen :: MutableGen (TGen g) STM -> STM (TGen g) #

thawGen :: TGen g -> STM (MutableGen (TGen g) STM) #

RandomGen g => StatefulGen (TGenM g) STM

Since: random-1.2.1

Instance details

Defined in System.Random.Stateful

RandomGen r => RandomGenM (TGenM r) r STM 
Instance details

Defined in System.Random.Stateful

Methods

applyRandomGenM :: (r -> (a, r)) -> TGenM r -> STM a #

type StM STM a 
Instance details

Defined in Control.Monad.Trans.Control

type StM STM a = a
type MutableGen (TGen g) STM 
Instance details

Defined in System.Random.Stateful

type MutableGen (TGen g) STM = TGenM g

writeTVar :: TVar a -> a -> STM () #

Write the supplied value into a TVar.

readTVar :: TVar a -> STM a #

Return the current value stored in a TVar.

orElse :: STM a -> STM a -> STM a #

Compose two alternative STM actions (GHC only).

If the first action completes without retrying then it forms the result of the orElse. Otherwise, if the first action retries, then the second action is tried in its place. If both actions retry then the orElse as a whole retries.

newTVar :: a -> STM (TVar a) #

Create a new TVar holding a value supplied

data SomeAsyncException #

Superclass for asynchronous exceptions.

Since: base-4.7.0.0

Constructors

Exception e => SomeAsyncException e 

data ExitCode #

Defines the exit codes that a program can return.

Constructors

ExitSuccess

indicates successful termination;

ExitFailure Int

indicates program failure with an exit code. The exact interpretation of the code is operating-system dependent. In particular, some values may be prohibited (e.g. 0 on a POSIX-compliant system).

Instances

Instances details
Arbitrary ExitCode 
Instance details

Defined in Test.QuickCheck.Arbitrary

Exception ExitCode

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Generic ExitCode 
Instance details

Defined in GHC.IO.Exception

Associated Types

type Rep ExitCode :: Type -> Type #

Methods

from :: ExitCode -> Rep ExitCode x #

to :: Rep ExitCode x -> ExitCode #

Read ExitCode 
Instance details

Defined in GHC.IO.Exception

Show ExitCode 
Instance details

Defined in GHC.IO.Exception

NFData ExitCode

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: ExitCode -> () #

Eq ExitCode 
Instance details

Defined in GHC.IO.Exception

Ord ExitCode 
Instance details

Defined in GHC.IO.Exception

type Rep ExitCode 
Instance details

Defined in GHC.IO.Exception

type Rep ExitCode = D1 ('MetaData "ExitCode" "GHC.IO.Exception" "base" 'False) (C1 ('MetaCons "ExitSuccess" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ExitFailure" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)))

asyncExceptionToException :: Exception e => e -> SomeException #

Since: base-4.7.0.0

data BufferMode #

Three kinds of buffering are supported: line-buffering, block-buffering or no-buffering. These modes have the following effects. For output, items are written out, or flushed, from the internal buffer according to the buffer mode:

  • line-buffering: the entire output buffer is flushed whenever a newline is output, the buffer overflows, a hFlush is issued, or the handle is closed.
  • block-buffering: the entire buffer is written out whenever it overflows, a hFlush is issued, or the handle is closed.
  • no-buffering: output is written immediately, and never stored in the buffer.

An implementation is free to flush the buffer more frequently, but not less frequently, than specified above. The output buffer is emptied as soon as it has been written out.

Similarly, input occurs according to the buffer mode for the handle:

  • line-buffering: when the buffer for the handle is not empty, the next item is obtained from the buffer; otherwise, when the buffer is empty, characters up to and including the next newline character are read into the buffer. No characters are available until the newline character is available or the buffer is full.
  • block-buffering: when the buffer for the handle becomes empty, the next block of data is read into the buffer.
  • no-buffering: the next input item is read and returned. The hLookAhead operation implies that even a no-buffered handle may require a one-character buffer.

The default buffering mode when a handle is opened is implementation-dependent and may depend on the file system object which is attached to that handle. For most implementations, physical files will normally be block-buffered and terminals will normally be line-buffered.

Constructors

NoBuffering

buffering is disabled if possible.

LineBuffering

line-buffering should be enabled if possible.

BlockBuffering (Maybe Int)

block-buffering should be enabled if possible. The size of the buffer is n items if the argument is Just n and is otherwise implementation-dependent.

Instances

Instances details
Read BufferMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Handle.Types

Show BufferMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Handle.Types

Eq BufferMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Handle.Types

Ord BufferMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Handle.Types

data SeekMode #

A mode that determines the effect of hSeek hdl mode i.

Constructors

AbsoluteSeek

the position of hdl is set to i.

RelativeSeek

the position of hdl is set to offset i from the current position.

SeekFromEnd

the position of hdl is set to offset i from the end of the file.

Instances

Instances details
Enum SeekMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Device

Ix SeekMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Device

Read SeekMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Device

Show SeekMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Device

Eq SeekMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Device

Ord SeekMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Device

data IOException #

Exceptions that occur in the IO monad. An IOException records a more specific error type, a descriptive string and maybe the handle that was used when the error was flagged.

Instances

Instances details
Exception IOException

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Show IOException

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Eq IOException

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Display IOException

Since: rio-0.1.0.0

Instance details

Defined in RIO.Prelude.Display

Error IOException 
Instance details

Defined in Control.Monad.Trans.Error

MonadError IOException IO 
Instance details

Defined in Control.Monad.Error.Class

Methods

throwError :: IOException -> IO a #

catchError :: IO a -> (IOException -> IO a) -> IO a #

newtype Const a (b :: k) #

The Const functor.

Constructors

Const 

Fields

Instances

Instances details
Generic1 (Const a :: k -> Type) 
Instance details

Defined in Data.Functor.Const

Associated Types

type Rep1 (Const a) :: k -> Type #

Methods

from1 :: forall (a0 :: k0). Const a a0 -> Rep1 (Const a) a0 #

to1 :: forall (a0 :: k0). Rep1 (Const a) a0 -> Const a a0 #

Unbox a => Vector Vector (Const a b) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: Mutable Vector s (Const a b) -> ST s (Vector (Const a b)) #

basicUnsafeThaw :: Vector (Const a b) -> ST s (Mutable Vector s (Const a b)) #

basicLength :: Vector (Const a b) -> Int #

basicUnsafeSlice :: Int -> Int -> Vector (Const a b) -> Vector (Const a b) #

basicUnsafeIndexM :: Vector (Const a b) -> Int -> Box (Const a b) #

basicUnsafeCopy :: Mutable Vector s (Const a b) -> Vector (Const a b) -> ST s () #

elemseq :: Vector (Const a b) -> Const a b -> b0 -> b0 #

Unbox a => MVector MVector (Const a b) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s (Const a b) -> Int #

basicUnsafeSlice :: Int -> Int -> MVector s (Const a b) -> MVector s (Const a b) #

basicOverlaps :: MVector s (Const a b) -> MVector s (Const a b) -> Bool #

basicUnsafeNew :: Int -> ST s (MVector s (Const a b)) #

basicInitialize :: MVector s (Const a b) -> ST s () #

basicUnsafeReplicate :: Int -> Const a b -> ST s (MVector s (Const a b)) #

basicUnsafeRead :: MVector s (Const a b) -> Int -> ST s (Const a b) #

basicUnsafeWrite :: MVector s (Const a b) -> Int -> Const a b -> ST s () #

basicClear :: MVector s (Const a b) -> ST s () #

basicSet :: MVector s (Const a b) -> Const a b -> ST s () #

basicUnsafeCopy :: MVector s (Const a b) -> MVector s (Const a b) -> ST s () #

basicUnsafeMove :: MVector s (Const a b) -> MVector s (Const a b) -> ST s () #

basicUnsafeGrow :: MVector s (Const a b) -> Int -> ST s (MVector s (Const a b)) #

Arbitrary2 (Const :: Type -> Type -> Type) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitrary2 :: Gen a -> Gen b -> Gen (Const a b) #

liftShrink2 :: (a -> [a]) -> (b -> [b]) -> Const a b -> [Const a b] #

FromJSON2 (Const :: Type -> Type -> Type) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON2 :: (Value -> Parser a) -> (Value -> Parser [a]) -> (Value -> Parser b) -> (Value -> Parser [b]) -> Value -> Parser (Const a b) #

liftParseJSONList2 :: (Value -> Parser a) -> (Value -> Parser [a]) -> (Value -> Parser b) -> (Value -> Parser [b]) -> Value -> Parser [Const a b] #

ToJSON2 (Const :: Type -> TYPE LiftedRep -> Type) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON2 :: (a -> Value) -> ([a] -> Value) -> (b -> Value) -> ([b] -> Value) -> Const a b -> Value #

liftToJSONList2 :: (a -> Value) -> ([a] -> Value) -> (b -> Value) -> ([b] -> Value) -> [Const a b] -> Value #

liftToEncoding2 :: (a -> Encoding) -> ([a] -> Encoding) -> (b -> Encoding) -> ([b] -> Encoding) -> Const a b -> Encoding #

liftToEncodingList2 :: (a -> Encoding) -> ([a] -> Encoding) -> (b -> Encoding) -> ([b] -> Encoding) -> [Const a b] -> Encoding #

Bifoldable (Const :: Type -> TYPE LiftedRep -> Type)

Since: base-4.10.0.0

Instance details

Defined in Data.Bifoldable

Methods

bifold :: Monoid m => Const m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> Const a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> Const a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> Const a b -> c #

Bifunctor (Const :: Type -> Type -> Type)

Since: base-4.8.0.0

Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> Const a c -> Const b d #

first :: (a -> b) -> Const a c -> Const b c #

second :: (b -> c) -> Const a b -> Const a c #

Bitraversable (Const :: Type -> Type -> Type)

Since: base-4.10.0.0

Instance details

Defined in Data.Bitraversable

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> Const a b -> f (Const c d) #

Eq2 (Const :: Type -> Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftEq2 :: (a -> b -> Bool) -> (c -> d -> Bool) -> Const a c -> Const b d -> Bool #

Ord2 (Const :: Type -> Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftCompare2 :: (a -> b -> Ordering) -> (c -> d -> Ordering) -> Const a c -> Const b d -> Ordering #

Read2 (Const :: Type -> Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftReadsPrec2 :: (Int -> ReadS a) -> ReadS [a] -> (Int -> ReadS b) -> ReadS [b] -> Int -> ReadS (Const a b) #

liftReadList2 :: (Int -> ReadS a) -> ReadS [a] -> (Int -> ReadS b) -> ReadS [b] -> ReadS [Const a b] #

liftReadPrec2 :: ReadPrec a -> ReadPrec [a] -> ReadPrec b -> ReadPrec [b] -> ReadPrec (Const a b) #

liftReadListPrec2 :: ReadPrec a -> ReadPrec [a] -> ReadPrec b -> ReadPrec [b] -> ReadPrec [Const a b] #

Show2 (Const :: Type -> TYPE LiftedRep -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec2 :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> (Int -> b -> ShowS) -> ([b] -> ShowS) -> Int -> Const a b -> ShowS #

liftShowList2 :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> (Int -> b -> ShowS) -> ([b] -> ShowS) -> [Const a b] -> ShowS #

Biapplicative (Const :: Type -> Type -> Type) 
Instance details

Defined in Data.Biapplicative

Methods

bipure :: a -> b -> Const a b #

(<<*>>) :: Const (a -> b) (c -> d) -> Const a c -> Const b d #

biliftA2 :: (a -> b -> c) -> (d -> e -> f) -> Const a d -> Const b e -> Const c f #

(*>>) :: Const a b -> Const c d -> Const c d #

(<<*) :: Const a b -> Const c d -> Const a b #

NFData2 (Const :: Type -> Type -> Type)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf2 :: (a -> ()) -> (b -> ()) -> Const a b -> () #

Hashable2 (Const :: Type -> Type -> Type) 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt2 :: (Int -> a -> Int) -> (Int -> b -> Int) -> Int -> Const a b -> Int #

Arbitrary a => Arbitrary1 (Const a :: Type -> Type) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitrary :: Gen a0 -> Gen (Const a a0) #

liftShrink :: (a0 -> [a0]) -> Const a a0 -> [Const a a0] #

FromJSON a => FromJSON1 (Const a :: Type -> Type) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: (Value -> Parser a0) -> (Value -> Parser [a0]) -> Value -> Parser (Const a a0) #

liftParseJSONList :: (Value -> Parser a0) -> (Value -> Parser [a0]) -> Value -> Parser [Const a a0] #

ToJSON a => ToJSON1 (Const a :: TYPE LiftedRep -> Type) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a0 -> Value) -> ([a0] -> Value) -> Const a a0 -> Value #

liftToJSONList :: (a0 -> Value) -> ([a0] -> Value) -> [Const a a0] -> Value #

liftToEncoding :: (a0 -> Encoding) -> ([a0] -> Encoding) -> Const a a0 -> Encoding #

liftToEncodingList :: (a0 -> Encoding) -> ([a0] -> Encoding) -> [Const a a0] -> Encoding #

Foldable (Const m :: TYPE LiftedRep -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Functor.Const

Methods

fold :: Monoid m0 => Const m m0 -> m0 #

foldMap :: Monoid m0 => (a -> m0) -> Const m a -> m0 #

foldMap' :: Monoid m0 => (a -> m0) -> Const m a -> m0 #

foldr :: (a -> b -> b) -> b -> Const m a -> b #

foldr' :: (a -> b -> b) -> b -> Const m a -> b #

foldl :: (b -> a -> b) -> b -> Const m a -> b #

foldl' :: (b -> a -> b) -> b -> Const m a -> b #

foldr1 :: (a -> a -> a) -> Const m a -> a #

foldl1 :: (a -> a -> a) -> Const m a -> a #

toList :: Const m a -> [a] #

null :: Const m a -> Bool #

length :: Const m a -> Int #

elem :: Eq a => a -> Const m a -> Bool #

maximum :: Ord a => Const m a -> a #

minimum :: Ord a => Const m a -> a #

sum :: Num a => Const m a -> a #

product :: Num a => Const m a -> a #

Eq a => Eq1 (Const a :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftEq :: (a0 -> b -> Bool) -> Const a a0 -> Const a b -> Bool #

Ord a => Ord1 (Const a :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftCompare :: (a0 -> b -> Ordering) -> Const a a0 -> Const a b -> Ordering #

Read a => Read1 (Const a :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftReadsPrec :: (Int -> ReadS a0) -> ReadS [a0] -> Int -> ReadS (Const a a0) #

liftReadList :: (Int -> ReadS a0) -> ReadS [a0] -> ReadS [Const a a0] #

liftReadPrec :: ReadPrec a0 -> ReadPrec [a0] -> ReadPrec (Const a a0) #

liftReadListPrec :: ReadPrec a0 -> ReadPrec [a0] -> ReadPrec [Const a a0] #

Show a => Show1 (Const a :: TYPE LiftedRep -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec :: (Int -> a0 -> ShowS) -> ([a0] -> ShowS) -> Int -> Const a a0 -> ShowS #

liftShowList :: (Int -> a0 -> ShowS) -> ([a0] -> ShowS) -> [Const a a0] -> ShowS #

Contravariant (Const a :: Type -> Type) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap :: (a' -> a0) -> Const a a0 -> Const a a' #

(>$) :: b -> Const a b -> Const a a0 #

Traversable (Const m :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Const m a -> f (Const m b) #

sequenceA :: Applicative f => Const m (f a) -> f (Const m a) #

mapM :: Monad m0 => (a -> m0 b) -> Const m a -> m0 (Const m b) #

sequence :: Monad m0 => Const m (m0 a) -> m0 (Const m a) #

Monoid m => Applicative (Const m :: Type -> Type)

Since: base-2.0.1

Instance details

Defined in Data.Functor.Const

Methods

pure :: a -> Const m a #

(<*>) :: Const m (a -> b) -> Const m a -> Const m b #

liftA2 :: (a -> b -> c) -> Const m a -> Const m b -> Const m c #

(*>) :: Const m a -> Const m b -> Const m b #

(<*) :: Const m a -> Const m b -> Const m a #

Functor (Const m :: Type -> Type)

Since: base-2.1

Instance details

Defined in Data.Functor.Const

Methods

fmap :: (a -> b) -> Const m a -> Const m b #

(<$) :: a -> Const m b -> Const m a #

NFData a => NFData1 (Const a :: TYPE LiftedRep -> Type)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a0 -> ()) -> Const a a0 -> () #

Hashable a => Hashable1 (Const a :: Type -> Type) 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a0 -> Int) -> Int -> Const a a0 -> Int #

Arbitrary a => Arbitrary (Const a b) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (Const a b) #

shrink :: Const a b -> [Const a b] #

CoArbitrary a => CoArbitrary (Const a b) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Const a b -> Gen b0 -> Gen b0 #

Function a => Function (Const a b) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Const a b -> b0) -> Const a b :-> b0 #

FromJSON a => FromJSON (Const a b) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Const a b) #

parseJSONList :: Value -> Parser [Const a b] #

(FromJSON a, FromJSONKey a) => FromJSONKey (Const a b) 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON a => ToJSON (Const a b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Const a b -> Value #

toEncoding :: Const a b -> Encoding #

toJSONList :: [Const a b] -> Value #

toEncodingList :: [Const a b] -> Encoding #

(ToJSON a, ToJSONKey a) => ToJSONKey (Const a b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

(Typeable k, Data a, Typeable b) => Data (Const a b)

Since: base-4.10.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> Const a b -> c (Const a b) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Const a b) #

toConstr :: Const a b -> Constr #

dataTypeOf :: Const a b -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Const a b)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Const a b)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> Const a b -> Const a b #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Const a b -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Const a b -> r #

gmapQ :: (forall d. Data d => d -> u) -> Const a b -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Const a b -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Const a b -> m (Const a b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Const a b -> m (Const a b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Const a b -> m (Const a b) #

IsString a => IsString (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.String

Methods

fromString :: String -> Const a b #

Storable a => Storable (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

sizeOf :: Const a b -> Int #

alignment :: Const a b -> Int #

peekElemOff :: Ptr (Const a b) -> Int -> IO (Const a b) #

pokeElemOff :: Ptr (Const a b) -> Int -> Const a b -> IO () #

peekByteOff :: Ptr b0 -> Int -> IO (Const a b) #

pokeByteOff :: Ptr b0 -> Int -> Const a b -> IO () #

peek :: Ptr (Const a b) -> IO (Const a b) #

poke :: Ptr (Const a b) -> Const a b -> IO () #

Monoid a => Monoid (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

mempty :: Const a b #

mappend :: Const a b -> Const a b -> Const a b #

mconcat :: [Const a b] -> Const a b #

Semigroup a => Semigroup (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

(<>) :: Const a b -> Const a b -> Const a b #

sconcat :: NonEmpty (Const a b) -> Const a b #

stimes :: Integral b0 => b0 -> Const a b -> Const a b #

Bits a => Bits (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

(.&.) :: Const a b -> Const a b -> Const a b #

(.|.) :: Const a b -> Const a b -> Const a b #

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 #

zeroBits :: Const a b #

bit :: 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 #

bitSize :: Const a b -> 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 #

rotateR :: Const a b -> Int -> Const a b #

popCount :: Const a b -> Int #

FiniteBits a => FiniteBits (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Bounded a => Bounded (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

minBound :: Const a b #

maxBound :: Const a b #

Enum a => Enum (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

succ :: Const a b -> Const a b #

pred :: Const a b -> Const a b #

toEnum :: Int -> Const a b #

fromEnum :: Const a b -> Int #

enumFrom :: Const a b -> [Const a b] #

enumFromThen :: Const a b -> Const a b -> [Const a b] #

enumFromTo :: Const a b -> Const a b -> [Const a b] #

enumFromThenTo :: Const a b -> Const a b -> Const a b -> [Const a b] #

Floating a => Floating (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

pi :: Const a b #

exp :: Const a b -> Const a b #

log :: Const a b -> Const a b #

sqrt :: Const a b -> Const a b #

(**) :: Const a b -> Const a b -> Const a b #

logBase :: Const a b -> Const a b -> Const a b #

sin :: Const a b -> Const a b #

cos :: Const a b -> Const a b #

tan :: Const a b -> Const a b #

asin :: Const a b -> Const a b #

acos :: Const a b -> Const a b #

atan :: Const a b -> Const a b #

sinh :: Const a b -> Const a b #

cosh :: Const a b -> Const a b #

tanh :: Const a b -> Const a b #

asinh :: Const a b -> Const a b #

acosh :: Const a b -> Const a b #

atanh :: Const a b -> Const a b #

log1p :: Const a b -> Const a b #

expm1 :: Const a b -> Const a b #

log1pexp :: Const a b -> Const a b #

log1mexp :: Const a b -> Const a b #

RealFloat a => RealFloat (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

floatRadix :: Const a b -> Integer #

floatDigits :: Const a b -> Int #

floatRange :: Const a b -> (Int, Int) #

decodeFloat :: Const a b -> (Integer, Int) #

encodeFloat :: Integer -> Int -> Const a b #

exponent :: Const a b -> Int #

significand :: Const a b -> Const a b #

scaleFloat :: Int -> Const a b -> Const a b #

isNaN :: Const a b -> Bool #

isInfinite :: Const a b -> Bool #

isDenormalized :: Const a b -> Bool #

isNegativeZero :: Const a b -> Bool #

isIEEE :: Const a b -> Bool #

atan2 :: Const a b -> Const a b -> Const a b #

Generic (Const a b) 
Instance details

Defined in Data.Functor.Const

Associated Types

type Rep (Const a b) :: Type -> Type #

Methods

from :: Const a b -> Rep (Const a b) x #

to :: Rep (Const a b) x -> Const a b #

Ix a => Ix (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

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)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

(+) :: Const a b -> Const a b -> Const a b #

(-) :: Const a b -> Const a b -> Const a b #

(*) :: Const a b -> Const a b -> Const a b #

negate :: Const a b -> Const a b #

abs :: Const a b -> Const a b #

signum :: Const a b -> Const a b #

fromInteger :: Integer -> Const a b #

Read a => Read (Const a b)

This instance would be equivalent to the derived instances of the Const newtype if the getConst field were removed

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Const

Fractional a => Fractional (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

(/) :: Const a b -> Const a b -> Const a b #

recip :: Const a b -> Const a b #

fromRational :: Rational -> Const a b #

Integral a => Integral (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

quot :: Const a b -> Const a b -> Const a b #

rem :: Const a b -> Const a b -> Const a b #

div :: Const a b -> Const a b -> Const a b #

mod :: Const a b -> Const a b -> Const a b #

quotRem :: Const a b -> Const a b -> (Const a b, Const a b) #

divMod :: Const a b -> Const a b -> (Const a b, Const a b) #

toInteger :: Const a b -> Integer #

Real a => Real (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

toRational :: Const a b -> Rational #

RealFrac a => RealFrac (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

properFraction :: Integral b0 => Const a b -> (b0, Const a b) #

truncate :: Integral b0 => Const a b -> b0 #

round :: Integral b0 => Const a b -> b0 #

ceiling :: Integral b0 => Const a b -> b0 #

floor :: Integral b0 => Const a b -> b0 #

Show a => Show (Const a b)

This instance would be equivalent to the derived instances of the Const newtype if the getConst field were removed

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Const

Methods

showsPrec :: Int -> Const a b -> ShowS #

show :: Const a b -> String #

showList :: [Const a b] -> ShowS #

NFData a => NFData (Const a b)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Const a b -> () #

Eq a => Eq (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

(==) :: Const a b -> Const a b -> Bool #

(/=) :: Const a b -> Const a b -> Bool #

Ord a => Ord (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

compare :: Const a b -> Const a b -> Ordering #

(<) :: Const a b -> Const a b -> Bool #

(<=) :: Const a b -> Const a b -> Bool #

(>) :: Const a b -> Const a b -> Bool #

(>=) :: Const a b -> Const a b -> Bool #

max :: Const a b -> Const a b -> Const a b #

min :: Const a b -> Const a b -> Const a b #

Hashable a => Hashable (Const a b) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Const a b -> Int #

hash :: Const a b -> Int #

Wrapped (Const a x) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Const a x) #

Methods

_Wrapped' :: Iso' (Const a x) (Unwrapped (Const a x)) #

MonoFoldable (Const m a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m0 => (Element (Const m a) -> m0) -> Const m a -> m0 #

ofoldr :: (Element (Const m a) -> b -> b) -> b -> Const m a -> b #

ofoldl' :: (a0 -> Element (Const m a) -> a0) -> a0 -> Const m a -> a0 #

otoList :: Const m a -> [Element (Const m a)] #

oall :: (Element (Const m a) -> Bool) -> Const m a -> Bool #

oany :: (Element (Const m a) -> Bool) -> Const m a -> Bool #

onull :: Const m a -> Bool #

olength :: Const m a -> Int #

olength64 :: Const m a -> Int64 #

ocompareLength :: Integral i => Const m a -> i -> Ordering #

otraverse_ :: Applicative f => (Element (Const m a) -> f b) -> Const m a -> f () #

ofor_ :: Applicative f => Const m a -> (Element (Const m a) -> f b) -> f () #

omapM_ :: Applicative m0 => (Element (Const m a) -> m0 ()) -> Const m a -> m0 () #

oforM_ :: Applicative m0 => Const m a -> (Element (Const m a) -> m0 ()) -> m0 () #

ofoldlM :: Monad m0 => (a0 -> Element (Const m a) -> m0 a0) -> a0 -> Const m a -> m0 a0 #

ofoldMap1Ex :: Semigroup m0 => (Element (Const m a) -> m0) -> Const m a -> m0 #

ofoldr1Ex :: (Element (Const m a) -> Element (Const m a) -> Element (Const m a)) -> Const m a -> Element (Const m a) #

ofoldl1Ex' :: (Element (Const m a) -> Element (Const m a) -> Element (Const m a)) -> Const m a -> Element (Const m a) #

headEx :: Const m a -> Element (Const m a) #

lastEx :: Const m a -> Element (Const m a) #

unsafeHead :: Const m a -> Element (Const m a) #

unsafeLast :: Const m a -> Element (Const m a) #

maximumByEx :: (Element (Const m a) -> Element (Const m a) -> Ordering) -> Const m a -> Element (Const m a) #

minimumByEx :: (Element (Const m a) -> Element (Const m a) -> Ordering) -> Const m a -> Element (Const m a) #

oelem :: Element (Const m a) -> Const m a -> Bool #

onotElem :: Element (Const m a) -> Const m a -> Bool #

MonoFunctor (Const m a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Const m a) -> Element (Const m a)) -> Const m a -> Const m a #

Monoid m => MonoPointed (Const m a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Const m a) -> Const m a #

MonoTraversable (Const m a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (Const m a) -> f (Element (Const m a))) -> Const m a -> f (Const m a) #

omapM :: Applicative m0 => (Element (Const m a) -> m0 (Element (Const m a))) -> Const m a -> m0 (Const m a) #

Pretty a => Pretty (Const a b) 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Const a b -> Doc ann #

prettyList :: [Const a b] -> Doc ann #

Prim a => Prim (Const a b)

Since: primitive-0.6.5.0

Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: Const a b -> Int# #

alignment# :: Const a b -> Int# #

indexByteArray# :: ByteArray# -> Int# -> Const a b #

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, Const a b #) #

writeByteArray# :: MutableByteArray# s -> Int# -> Const a b -> State# s -> State# s #

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> Const a b -> State# s -> State# s #

indexOffAddr# :: Addr# -> Int# -> Const a b #

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, Const a b #) #

writeOffAddr# :: Addr# -> Int# -> Const a b -> State# s -> State# s #

setOffAddr# :: Addr# -> Int# -> Int# -> Const a b -> State# s -> State# s #

Unbox a => Unbox (Const a b) 
Instance details

Defined in Data.Vector.Unboxed.Base

t ~ Const a' x' => Rewrapped (Const a x) t 
Instance details

Defined in Control.Lens.Wrapped

type Rep1 (Const a :: k -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

type Rep1 (Const a :: k -> Type) = D1 ('MetaData "Const" "Data.Functor.Const" "base" 'True) (C1 ('MetaCons "Const" 'PrefixI 'True) (S1 ('MetaSel ('Just "getConst") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))
newtype MVector s (Const a b) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s (Const a b) = MV_Const (MVector s a)
type Rep (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

type Rep (Const a b) = D1 ('MetaData "Const" "Data.Functor.Const" "base" 'True) (C1 ('MetaCons "Const" 'PrefixI 'True) (S1 ('MetaSel ('Just "getConst") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))
type Unwrapped (Const a x) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (Const a x) = a
type Element (Const m a) 
Instance details

Defined in Data.MonoTraversable

type Element (Const m a) = a
newtype Vector (Const a b) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector (Const a b) = V_Const (Vector a)

traverse_ :: (Foldable t, Applicative f) => (a -> f b) -> t a -> f () #

Map each element of a structure to an Applicative action, evaluate these actions from left to right, and ignore the results. For a version that doesn't ignore the results see traverse.

traverse_ is just like mapM_, but generalised to Applicative actions.

Examples

Expand

Basic usage:

>>> traverse_ print ["Hello", "world", "!"]
"Hello"
"world"
"!"

sequenceA_ :: (Foldable t, Applicative f) => t (f a) -> f () #

Evaluate each action in the structure from left to right, and ignore the results. For a version that doesn't ignore the results see sequenceA.

sequenceA_ is just like sequence_, but generalised to Applicative actions.

Examples

Expand

Basic usage:

>>> sequenceA_ [print "Hello", print "world", print "!"]
"Hello"
"world"
"!"

for_ :: (Foldable t, Applicative f) => t a -> (a -> f b) -> f () #

for_ is traverse_ with its arguments flipped. For a version that doesn't ignore the results see for. This is forM_ generalised to Applicative actions.

for_ is just like forM_, but generalised to Applicative actions.

Examples

Expand

Basic usage:

>>> for_ [1..4] print
1
2
3
4

asum :: (Foldable t, Alternative f) => t (f a) -> f a #

The sum of a collection of actions, generalizing concat.

asum is just like msum, but generalised to Alternative.

Examples

Expand

Basic usage:

>>> asum [Just "Hello", Nothing, Just "World"]
Just "Hello"

newtype Down a #

The Down type allows you to reverse sort order conveniently. A value of type Down a contains a value of type a (represented as Down a).

If a has an Ord instance associated with it then comparing two values thus wrapped will give you the opposite of their normal sort order. This is particularly useful when sorting in generalised list comprehensions, as in: then sortWith by Down x.

>>> compare True False
GT
>>> compare (Down True) (Down False)
LT

If a has a Bounded instance then the wrapped instance also respects the reversed ordering by exchanging the values of minBound and maxBound.

>>> minBound :: Int
-9223372036854775808
>>> minBound :: Down Int
Down 9223372036854775807

All other instances of Down a behave as they do for a.

Since: base-4.6.0.0

Constructors

Down 

Fields

Instances

Instances details
MonadFix Down

Since: base-4.12.0.0

Instance details

Defined in Control.Monad.Fix

Methods

mfix :: (a -> Down a) -> Down a #

Foldable Down

Since: base-4.12.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Down m -> m #

foldMap :: Monoid m => (a -> m) -> Down a -> m #

foldMap' :: Monoid m => (a -> m) -> Down a -> m #

foldr :: (a -> b -> b) -> b -> Down a -> b #

foldr' :: (a -> b -> b) -> b -> Down a -> b #

foldl :: (b -> a -> b) -> b -> Down a -> b #

foldl' :: (b -> a -> b) -> b -> Down a -> b #

foldr1 :: (a -> a -> a) -> Down a -> a #

foldl1 :: (a -> a -> a) -> Down a -> a #

toList :: Down a -> [a] #

null :: Down a -> Bool #

length :: Down a -> Int #

elem :: Eq a => a -> Down a -> Bool #

maximum :: Ord a => Down a -> a #

minimum :: Ord a => Down a -> a #

sum :: Num a => Down a -> a #

product :: Num a => Down a -> a #

Eq1 Down

Since: base-4.12.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftEq :: (a -> b -> Bool) -> Down a -> Down b -> Bool #

Ord1 Down

Since: base-4.12.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftCompare :: (a -> b -> Ordering) -> Down a -> Down b -> Ordering #

Read1 Down

Since: base-4.12.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (Down a) #

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [Down a] #

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (Down a) #

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [Down a] #

Show1 Down

Since: base-4.12.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Down a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Down a] -> ShowS #

Traversable Down

Since: base-4.12.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Down a -> f (Down b) #

sequenceA :: Applicative f => Down (f a) -> f (Down a) #

mapM :: Monad m => (a -> m b) -> Down a -> m (Down b) #

sequence :: Monad m => Down (m a) -> m (Down a) #

Applicative Down

Since: base-4.11.0.0

Instance details

Defined in Data.Ord

Methods

pure :: a -> Down a #

(<*>) :: Down (a -> b) -> Down a -> Down b #

liftA2 :: (a -> b -> c) -> Down a -> Down b -> Down c #

(*>) :: Down a -> Down b -> Down b #

(<*) :: Down a -> Down b -> Down a #

Functor Down

Since: base-4.11.0.0

Instance details

Defined in Data.Ord

Methods

fmap :: (a -> b) -> Down a -> Down b #

(<$) :: a -> Down b -> Down a #

Monad Down

Since: base-4.11.0.0

Instance details

Defined in Data.Ord

Methods

(>>=) :: Down a -> (a -> Down b) -> Down b #

(>>) :: Down a -> Down b -> Down b #

return :: a -> Down a #

NFData1 Down

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> Down a -> () #

Generic1 Down 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 Down :: k -> Type #

Methods

from1 :: forall (a :: k). Down a -> Rep1 Down a #

to1 :: forall (a :: k). Rep1 Down a -> Down a #

Unbox a => Vector Vector (Down a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: Mutable Vector s (Down a) -> ST s (Vector (Down a)) #

basicUnsafeThaw :: Vector (Down a) -> ST s (Mutable Vector s (Down a)) #

basicLength :: Vector (Down a) -> Int #

basicUnsafeSlice :: Int -> Int -> Vector (Down a) -> Vector (Down a) #

basicUnsafeIndexM :: Vector (Down a) -> Int -> Box (Down a) #

basicUnsafeCopy :: Mutable Vector s (Down a) -> Vector (Down a) -> ST s () #

elemseq :: Vector (Down a) -> Down a -> b -> b #

Unbox a => MVector MVector (Down a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s (Down a) -> Int #

basicUnsafeSlice :: Int -> Int -> MVector s (Down a) -> MVector s (Down a) #

basicOverlaps :: MVector s (Down a) -> MVector s (Down a) -> Bool #

basicUnsafeNew :: Int -> ST s (MVector s (Down a)) #

basicInitialize :: MVector s (Down a) -> ST s () #

basicUnsafeReplicate :: Int -> Down a -> ST s (MVector s (Down a)) #

basicUnsafeRead :: MVector s (Down a) -> Int -> ST s (Down a) #

basicUnsafeWrite :: MVector s (Down a) -> Int -> Down a -> ST s () #

basicClear :: MVector s (Down a) -> ST s () #

basicSet :: MVector s (Down a) -> Down a -> ST s () #

basicUnsafeCopy :: MVector s (Down a) -> MVector s (Down a) -> ST s () #

basicUnsafeMove :: MVector s (Down a) -> MVector s (Down a) -> ST s () #

basicUnsafeGrow :: MVector s (Down a) -> Int -> ST s (MVector s (Down a)) #

Data a => Data (Down a)

Since: base-4.12.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Down a -> c (Down a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Down a) #

toConstr :: Down a -> Constr #

dataTypeOf :: Down a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Down a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Down a)) #

gmapT :: (forall b. Data b => b -> b) -> Down a -> Down a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Down a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Down a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Down a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Down a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Down a -> m (Down a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Down a -> m (Down a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Down a -> m (Down a) #

Storable a => Storable (Down a)

Since: base-4.14.0.0

Instance details

Defined in Data.Ord

Methods

sizeOf :: Down a -> Int #

alignment :: Down a -> Int #

peekElemOff :: Ptr (Down a) -> Int -> IO (Down a) #

pokeElemOff :: Ptr (Down a) -> Int -> Down a -> IO () #

peekByteOff :: Ptr b -> Int -> IO (Down a) #

pokeByteOff :: Ptr b -> Int -> Down a -> IO () #

peek :: Ptr (Down a) -> IO (Down a) #

poke :: Ptr (Down a) -> Down a -> IO () #

Monoid a => Monoid (Down a)

Since: base-4.11.0.0

Instance details

Defined in Data.Ord

Methods

mempty :: Down a #

mappend :: Down a -> Down a -> Down a #

mconcat :: [Down a] -> Down a #

Semigroup a => Semigroup (Down a)

Since: base-4.11.0.0

Instance details

Defined in Data.Ord

Methods

(<>) :: Down a -> Down a -> Down a #

sconcat :: NonEmpty (Down a) -> Down a #

stimes :: Integral b => b -> Down a -> Down a #

Bits a => Bits (Down a)

Since: base-4.14.0.0

Instance details

Defined in Data.Ord

Methods

(.&.) :: Down a -> Down a -> Down a #

(.|.) :: Down a -> Down a -> Down a #

xor :: Down a -> Down a -> Down a #

complement :: Down a -> Down a #

shift :: Down a -> Int -> Down a #

rotate :: Down a -> Int -> Down a #

zeroBits :: Down a #

bit :: Int -> Down a #

setBit :: Down a -> Int -> Down a #

clearBit :: Down a -> Int -> Down a #

complementBit :: Down a -> Int -> Down a #

testBit :: Down a -> Int -> Bool #

bitSizeMaybe :: Down a -> Maybe Int #

bitSize :: Down a -> Int #

isSigned :: Down a -> Bool #

shiftL :: Down a -> Int -> Down a #

unsafeShiftL :: Down a -> Int -> Down a #

shiftR :: Down a -> Int -> Down a #

unsafeShiftR :: Down a -> Int -> Down a #

rotateL :: Down a -> Int -> Down a #

rotateR :: Down a -> Int -> Down a #

popCount :: Down a -> Int #

FiniteBits a => FiniteBits (Down a)

Since: base-4.14.0.0

Instance details

Defined in Data.Ord

Bounded a => Bounded (Down a)

Swaps minBound and maxBound of the underlying type.

Since: base-4.14.0.0

Instance details

Defined in Data.Ord

Methods

minBound :: Down a #

maxBound :: Down a #

Floating a => Floating (Down a)

Since: base-4.14.0.0

Instance details

Defined in Data.Ord

Methods

pi :: Down a #

exp :: Down a -> Down a #

log :: Down a -> Down a #

sqrt :: Down a -> Down a #

(**) :: Down a -> Down a -> Down a #

logBase :: Down a -> Down a -> Down a #

sin :: Down a -> Down a #

cos :: Down a -> Down a #

tan :: Down a -> Down a #

asin :: Down a -> Down a #

acos :: Down a -> Down a #

atan :: Down a -> Down a #

sinh :: Down a -> Down a #

cosh :: Down a -> Down a #

tanh :: Down a -> Down a #

asinh :: Down a -> Down a #

acosh :: Down a -> Down a #

atanh :: Down a -> Down a #

log1p :: Down a -> Down a #

expm1 :: Down a -> Down a #

log1pexp :: Down a -> Down a #

log1mexp :: Down a -> Down a #

RealFloat a => RealFloat (Down a)

Since: base-4.14.0.0

Instance details

Defined in Data.Ord

Generic (Down a) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Down a) :: Type -> Type #

Methods

from :: Down a -> Rep (Down a) x #

to :: Rep (Down a) x -> Down a #

Ix a => Ix (Down a)

Since: base-4.14.0.0

Instance details

Defined in Data.Ord

Methods

range :: (Down a, Down a) -> [Down a] #

index :: (Down a, Down a) -> Down a -> Int #

unsafeIndex :: (Down a, Down a) -> Down a -> Int #

inRange :: (Down a, Down a) -> Down a -> Bool #

rangeSize :: (Down a, Down a) -> Int #

unsafeRangeSize :: (Down a, Down a) -> Int #

Num a => Num (Down a)

Since: base-4.11.0.0

Instance details

Defined in Data.Ord

Methods

(+) :: Down a -> Down a -> Down a #

(-) :: Down a -> Down a -> Down a #

(*) :: Down a -> Down a -> Down a #

negate :: Down a -> Down a #

abs :: Down a -> Down a #

signum :: Down a -> Down a #

fromInteger :: Integer -> Down a #

Read a => Read (Down a)

This instance would be equivalent to the derived instances of the Down newtype if the getDown field were removed

Since: base-4.7.0.0

Instance details

Defined in Data.Ord

Fractional a => Fractional (Down a)

Since: base-4.14.0.0

Instance details

Defined in Data.Ord

Methods

(/) :: Down a -> Down a -> Down a #

recip :: Down a -> Down a #

fromRational :: Rational -> Down a #

Real a => Real (Down a)

Since: base-4.14.0.0

Instance details

Defined in Data.Ord

Methods

toRational :: Down a -> Rational #

RealFrac a => RealFrac (Down a)

Since: base-4.14.0.0

Instance details

Defined in Data.Ord

Methods

properFraction :: Integral b => Down a -> (b, Down a) #

truncate :: Integral b => Down a -> b #

round :: Integral b => Down a -> b #

ceiling :: Integral b => Down a -> b #

floor :: Integral b => Down a -> b #

Show a => Show (Down a)

This instance would be equivalent to the derived instances of the Down newtype if the getDown field were removed

Since: base-4.7.0.0

Instance details

Defined in Data.Ord

Methods

showsPrec :: Int -> Down a -> ShowS #

show :: Down a -> String #

showList :: [Down a] -> ShowS #

NFData a => NFData (Down a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Down a -> () #

Eq a => Eq (Down a)

Since: base-4.6.0.0

Instance details

Defined in Data.Ord

Methods

(==) :: Down a -> Down a -> Bool #

(/=) :: Down a -> Down a -> Bool #

Ord a => Ord (Down a)

Since: base-4.6.0.0

Instance details

Defined in Data.Ord

Methods

compare :: Down a -> Down a -> Ordering #

(<) :: Down a -> Down a -> Bool #

(<=) :: Down a -> Down a -> Bool #

(>) :: Down a -> Down a -> Bool #

(>=) :: Down a -> Down a -> Bool #

max :: Down a -> Down a -> Down a #

min :: Down a -> Down a -> Down a #

Wrapped (Down a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Down a) #

Methods

_Wrapped' :: Iso' (Down a) (Unwrapped (Down a)) #

Prim a => Prim (Down a)

Since: primitive-0.6.5.0

Instance details

Defined in Data.Primitive.Types

Unbox a => Unbox (Down a) 
Instance details

Defined in Data.Vector.Unboxed.Base

t ~ Down b => Rewrapped (Down a) t 
Instance details

Defined in Control.Lens.Wrapped

type Rep1 Down

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

type Rep1 Down = D1 ('MetaData "Down" "Data.Ord" "base" 'True) (C1 ('MetaCons "Down" 'PrefixI 'True) (S1 ('MetaSel ('Just "getDown") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1))
newtype MVector s (Down a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s (Down a) = MV_Down (MVector s a)
type Rep (Down a)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

type Rep (Down a) = D1 ('MetaData "Down" "Data.Ord" "base" 'True) (C1 ('MetaCons "Down" 'PrefixI 'True) (S1 ('MetaSel ('Just "getDown") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))
type Unwrapped (Down a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (Down a) = a
newtype Vector (Down a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector (Down a) = V_Down (Vector a)

comparing :: Ord a => (b -> a) -> b -> b -> Ordering #

comparing p x y = compare (p x) (p y)

Useful combinator for use in conjunction with the xxxBy family of functions from Data.List, for example:

  ... sortBy (comparing fst) ...

class Storable a #

The member functions of this class facilitate writing values of primitive types to raw memory (which may have been allocated with the above mentioned routines) and reading values from blocks of raw memory. The class, furthermore, includes support for computing the storage requirements and alignment restrictions of storable types.

Memory addresses are represented as values of type Ptr a, for some a which is an instance of class Storable. The type argument to Ptr helps provide some valuable type safety in FFI code (you can't mix pointers of different types without an explicit cast), while helping the Haskell type system figure out which marshalling method is needed for a given pointer.

All marshalling between Haskell and a foreign language ultimately boils down to translating Haskell data structures into the binary representation of a corresponding data structure of the foreign language and vice versa. To code this marshalling in Haskell, it is necessary to manipulate primitive data types stored in unstructured memory blocks. The class Storable facilitates this manipulation on all types for which it is instantiated, which are the standard basic types of Haskell, the fixed size Int types (Int8, Int16, Int32, Int64), the fixed size Word types (Word8, Word16, Word32, Word64), StablePtr, all types from Foreign.C.Types, as well as Ptr.

Minimal complete definition

sizeOf, alignment, (peek | peekElemOff | peekByteOff), (poke | pokeElemOff | pokeByteOff)

Instances

Instances details
Storable CBool 
Instance details

Defined in Foreign.C.Types

Methods

sizeOf :: CBool -> Int #

alignment :: CBool -> Int #

peekElemOff :: Ptr CBool -> Int -> IO CBool #

pokeElemOff :: Ptr CBool -> Int -> CBool -> IO () #

peekByteOff :: Ptr b -> Int -> IO CBool #

pokeByteOff :: Ptr b -> Int -> CBool -> IO () #

peek :: Ptr CBool -> IO CBool #

poke :: Ptr CBool -> CBool -> IO () #

Storable CChar 
Instance details

Defined in Foreign.C.Types

Methods

sizeOf :: CChar -> Int #

alignment :: CChar -> Int #

peekElemOff :: Ptr CChar -> Int -> IO CChar #

pokeElemOff :: Ptr CChar -> Int -> CChar -> IO () #

peekByteOff :: Ptr b -> Int -> IO CChar #

pokeByteOff :: Ptr b -> Int -> CChar -> IO () #

peek :: Ptr CChar -> IO CChar #

poke :: Ptr CChar -> CChar -> IO () #

Storable CClock 
Instance details

Defined in Foreign.C.Types

Storable CDouble 
Instance details

Defined in Foreign.C.Types

Storable CFloat 
Instance details

Defined in Foreign.C.Types

Storable CInt 
Instance details

Defined in Foreign.C.Types

Methods

sizeOf :: CInt -> Int #

alignment :: CInt -> Int #

peekElemOff :: Ptr CInt -> Int -> IO CInt #

pokeElemOff :: Ptr CInt -> Int -> CInt -> IO () #

peekByteOff :: Ptr b -> Int -> IO CInt #

pokeByteOff :: Ptr b -> Int -> CInt -> IO () #

peek :: Ptr CInt -> IO CInt #

poke :: Ptr CInt -> CInt -> IO () #

Storable CIntMax 
Instance details

Defined in Foreign.C.Types

Storable CIntPtr 
Instance details

Defined in Foreign.C.Types

Storable CLLong 
Instance details

Defined in Foreign.C.Types

Storable CLong 
Instance details

Defined in Foreign.C.Types

Methods

sizeOf :: CLong -> Int #

alignment :: CLong -> Int #

peekElemOff :: Ptr CLong -> Int -> IO CLong #

pokeElemOff :: Ptr CLong -> Int -> CLong -> IO () #

peekByteOff :: Ptr b -> Int -> IO CLong #

pokeByteOff :: Ptr b -> Int -> CLong -> IO () #

peek :: Ptr CLong -> IO CLong #

poke :: Ptr CLong -> CLong -> IO () #

Storable CPtrdiff 
Instance details

Defined in Foreign.C.Types

Storable CSChar 
Instance details

Defined in Foreign.C.Types

Storable CSUSeconds 
Instance details

Defined in Foreign.C.Types

Storable CShort 
Instance details

Defined in Foreign.C.Types

Storable CSigAtomic 
Instance details

Defined in Foreign.C.Types

Storable CSize 
Instance details

Defined in Foreign.C.Types

Methods

sizeOf :: CSize -> Int #

alignment :: CSize -> Int #

peekElemOff :: Ptr CSize -> Int -> IO CSize #

pokeElemOff :: Ptr CSize -> Int -> CSize -> IO () #

peekByteOff :: Ptr b -> Int -> IO CSize #

pokeByteOff :: Ptr b -> Int -> CSize -> IO () #

peek :: Ptr CSize -> IO CSize #

poke :: Ptr CSize -> CSize -> IO () #

Storable CTime 
Instance details

Defined in Foreign.C.Types

Methods

sizeOf :: CTime -> Int #

alignment :: CTime -> Int #

peekElemOff :: Ptr CTime -> Int -> IO CTime #

pokeElemOff :: Ptr CTime -> Int -> CTime -> IO () #

peekByteOff :: Ptr b -> Int -> IO CTime #

pokeByteOff :: Ptr b -> Int -> CTime -> IO () #

peek :: Ptr CTime -> IO CTime #

poke :: Ptr CTime -> CTime -> IO () #

Storable CUChar 
Instance details

Defined in Foreign.C.Types

Storable CUInt 
Instance details

Defined in Foreign.C.Types

Methods

sizeOf :: CUInt -> Int #

alignment :: CUInt -> Int #

peekElemOff :: Ptr CUInt -> Int -> IO CUInt #

pokeElemOff :: Ptr CUInt -> Int -> CUInt -> IO () #

peekByteOff :: Ptr b -> Int -> IO CUInt #

pokeByteOff :: Ptr b -> Int -> CUInt -> IO () #

peek :: Ptr CUInt -> IO CUInt #

poke :: Ptr CUInt -> CUInt -> IO () #

Storable CUIntMax 
Instance details

Defined in Foreign.C.Types

Storable CUIntPtr 
Instance details

Defined in Foreign.C.Types

Storable CULLong 
Instance details

Defined in Foreign.C.Types

Storable CULong 
Instance details

Defined in Foreign.C.Types

Storable CUSeconds 
Instance details

Defined in Foreign.C.Types

Storable CUShort 
Instance details

Defined in Foreign.C.Types

Storable CWchar 
Instance details

Defined in Foreign.C.Types

Storable Fingerprint

Since: base-4.4.0.0

Instance details

Defined in Foreign.Storable

Storable Int16

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Int16 -> Int #

alignment :: Int16 -> Int #

peekElemOff :: Ptr Int16 -> Int -> IO Int16 #

pokeElemOff :: Ptr Int16 -> Int -> Int16 -> IO () #

peekByteOff :: Ptr b -> Int -> IO Int16 #

pokeByteOff :: Ptr b -> Int -> Int16 -> IO () #

peek :: Ptr Int16 -> IO Int16 #

poke :: Ptr Int16 -> Int16 -> IO () #

Storable Int32

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Int32 -> Int #

alignment :: Int32 -> Int #

peekElemOff :: Ptr Int32 -> Int -> IO Int32 #

pokeElemOff :: Ptr Int32 -> Int -> Int32 -> IO () #

peekByteOff :: Ptr b -> Int -> IO Int32 #

pokeByteOff :: Ptr b -> Int -> Int32 -> IO () #

peek :: Ptr Int32 -> IO Int32 #

poke :: Ptr Int32 -> Int32 -> IO () #

Storable Int64

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Int64 -> Int #

alignment :: Int64 -> Int #

peekElemOff :: Ptr Int64 -> Int -> IO Int64 #

pokeElemOff :: Ptr Int64 -> Int -> Int64 -> IO () #

peekByteOff :: Ptr b -> Int -> IO Int64 #

pokeByteOff :: Ptr b -> Int -> Int64 -> IO () #

peek :: Ptr Int64 -> IO Int64 #

poke :: Ptr Int64 -> Int64 -> IO () #

Storable Int8

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Int8 -> Int #

alignment :: Int8 -> Int #

peekElemOff :: Ptr Int8 -> Int -> IO Int8 #

pokeElemOff :: Ptr Int8 -> Int -> Int8 -> IO () #

peekByteOff :: Ptr b -> Int -> IO Int8 #

pokeByteOff :: Ptr b -> Int -> Int8 -> IO () #

peek :: Ptr Int8 -> IO Int8 #

poke :: Ptr Int8 -> Int8 -> IO () #

Storable IoSubSystem

Since: base-4.9.0.0

Instance details

Defined in GHC.RTS.Flags

Storable Word16

Since: base-2.1

Instance details

Defined in Foreign.Storable

Storable Word32

Since: base-2.1

Instance details

Defined in Foreign.Storable

Storable Word64

Since: base-2.1

Instance details

Defined in Foreign.Storable

Storable Word8

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Word8 -> Int #

alignment :: Word8 -> Int #

peekElemOff :: Ptr Word8 -> Int -> IO Word8 #

pokeElemOff :: Ptr Word8 -> Int -> Word8 -> IO () #

peekByteOff :: Ptr b -> Int -> IO Word8 #

pokeByteOff :: Ptr b -> Int -> Word8 -> IO () #

peek :: Ptr Word8 -> IO Word8 #

poke :: Ptr Word8 -> Word8 -> IO () #

Storable CBlkCnt 
Instance details

Defined in System.Posix.Types

Storable CBlkSize 
Instance details

Defined in System.Posix.Types

Storable CCc 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: CCc -> Int #

alignment :: CCc -> Int #

peekElemOff :: Ptr CCc -> Int -> IO CCc #

pokeElemOff :: Ptr CCc -> Int -> CCc -> IO () #

peekByteOff :: Ptr b -> Int -> IO CCc #

pokeByteOff :: Ptr b -> Int -> CCc -> IO () #

peek :: Ptr CCc -> IO CCc #

poke :: Ptr CCc -> CCc -> IO () #

Storable CClockId 
Instance details

Defined in System.Posix.Types

Storable CDev 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: CDev -> Int #

alignment :: CDev -> Int #

peekElemOff :: Ptr CDev -> Int -> IO CDev #

pokeElemOff :: Ptr CDev -> Int -> CDev -> IO () #

peekByteOff :: Ptr b -> Int -> IO CDev #

pokeByteOff :: Ptr b -> Int -> CDev -> IO () #

peek :: Ptr CDev -> IO CDev #

poke :: Ptr CDev -> CDev -> IO () #

Storable CFsBlkCnt 
Instance details

Defined in System.Posix.Types

Storable CFsFilCnt 
Instance details

Defined in System.Posix.Types

Storable CGid 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: CGid -> Int #

alignment :: CGid -> Int #

peekElemOff :: Ptr CGid -> Int -> IO CGid #

pokeElemOff :: Ptr CGid -> Int -> CGid -> IO () #

peekByteOff :: Ptr b -> Int -> IO CGid #

pokeByteOff :: Ptr b -> Int -> CGid -> IO () #

peek :: Ptr CGid -> IO CGid #

poke :: Ptr CGid -> CGid -> IO () #

Storable CId 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: CId -> Int #

alignment :: CId -> Int #

peekElemOff :: Ptr CId -> Int -> IO CId #

pokeElemOff :: Ptr CId -> Int -> CId -> IO () #

peekByteOff :: Ptr b -> Int -> IO CId #

pokeByteOff :: Ptr b -> Int -> CId -> IO () #

peek :: Ptr CId -> IO CId #

poke :: Ptr CId -> CId -> IO () #

Storable CIno 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: CIno -> Int #

alignment :: CIno -> Int #

peekElemOff :: Ptr CIno -> Int -> IO CIno #

pokeElemOff :: Ptr CIno -> Int -> CIno -> IO () #

peekByteOff :: Ptr b -> Int -> IO CIno #

pokeByteOff :: Ptr b -> Int -> CIno -> IO () #

peek :: Ptr CIno -> IO CIno #

poke :: Ptr CIno -> CIno -> IO () #

Storable CKey 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: CKey -> Int #

alignment :: CKey -> Int #

peekElemOff :: Ptr CKey -> Int -> IO CKey #

pokeElemOff :: Ptr CKey -> Int -> CKey -> IO () #

peekByteOff :: Ptr b -> Int -> IO CKey #

pokeByteOff :: Ptr b -> Int -> CKey -> IO () #

peek :: Ptr CKey -> IO CKey #

poke :: Ptr CKey -> CKey -> IO () #

Storable CMode 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: CMode -> Int #

alignment :: CMode -> Int #

peekElemOff :: Ptr CMode -> Int -> IO CMode #

pokeElemOff :: Ptr CMode -> Int -> CMode -> IO () #

peekByteOff :: Ptr b -> Int -> IO CMode #

pokeByteOff :: Ptr b -> Int -> CMode -> IO () #

peek :: Ptr CMode -> IO CMode #

poke :: Ptr CMode -> CMode -> IO () #

Storable CNfds 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: CNfds -> Int #

alignment :: CNfds -> Int #

peekElemOff :: Ptr CNfds -> Int -> IO CNfds #

pokeElemOff :: Ptr CNfds -> Int -> CNfds -> IO () #

peekByteOff :: Ptr b -> Int -> IO CNfds #

pokeByteOff :: Ptr b -> Int -> CNfds -> IO () #

peek :: Ptr CNfds -> IO CNfds #

poke :: Ptr CNfds -> CNfds -> IO () #

Storable CNlink 
Instance details

Defined in System.Posix.Types

Storable COff 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: COff -> Int #

alignment :: COff -> Int #

peekElemOff :: Ptr COff -> Int -> IO COff #

pokeElemOff :: Ptr COff -> Int -> COff -> IO () #

peekByteOff :: Ptr b -> Int -> IO COff #

pokeByteOff :: Ptr b -> Int -> COff -> IO () #

peek :: Ptr COff -> IO COff #

poke :: Ptr COff -> COff -> IO () #

Storable CPid 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: CPid -> Int #

alignment :: CPid -> Int #

peekElemOff :: Ptr CPid -> Int -> IO CPid #

pokeElemOff :: Ptr CPid -> Int -> CPid -> IO () #

peekByteOff :: Ptr b -> Int -> IO CPid #

pokeByteOff :: Ptr b -> Int -> CPid -> IO () #

peek :: Ptr CPid -> IO CPid #

poke :: Ptr CPid -> CPid -> IO () #

Storable CRLim 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: CRLim -> Int #

alignment :: CRLim -> Int #

peekElemOff :: Ptr CRLim -> Int -> IO CRLim #

pokeElemOff :: Ptr CRLim -> Int -> CRLim -> IO () #

peekByteOff :: Ptr b -> Int -> IO CRLim #

pokeByteOff :: Ptr b -> Int -> CRLim -> IO () #

peek :: Ptr CRLim -> IO CRLim #

poke :: Ptr CRLim -> CRLim -> IO () #

Storable CSocklen 
Instance details

Defined in System.Posix.Types

Storable CSpeed 
Instance details

Defined in System.Posix.Types

Storable CSsize 
Instance details

Defined in System.Posix.Types

Storable CTcflag 
Instance details

Defined in System.Posix.Types

Storable CTimer 
Instance details

Defined in System.Posix.Types

Storable CUid 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: CUid -> Int #

alignment :: CUid -> Int #

peekElemOff :: Ptr CUid -> Int -> IO CUid #

pokeElemOff :: Ptr CUid -> Int -> CUid -> IO () #

peekByteOff :: Ptr b -> Int -> IO CUid #

pokeByteOff :: Ptr b -> Int -> CUid -> IO () #

peek :: Ptr CUid -> IO CUid #

poke :: Ptr CUid -> CUid -> IO () #

Storable Fd 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: Fd -> Int #

alignment :: Fd -> Int #

peekElemOff :: Ptr Fd -> Int -> IO Fd #

pokeElemOff :: Ptr Fd -> Int -> Fd -> IO () #

peekByteOff :: Ptr b -> Int -> IO Fd #

pokeByteOff :: Ptr b -> Int -> Fd -> IO () #

peek :: Ptr Fd -> IO Fd #

poke :: Ptr Fd -> Fd -> IO () #

Storable AddrInfo 
Instance details

Defined in Network.Socket.Info

Storable CodePoint 
Instance details

Defined in Data.Text.Encoding

Methods

sizeOf :: CodePoint -> Int #

alignment :: CodePoint -> Int #

peekElemOff :: Ptr CodePoint -> Int -> IO CodePoint #

pokeElemOff :: Ptr CodePoint -> Int -> CodePoint -> IO () #

peekByteOff :: Ptr b -> Int -> IO CodePoint #

pokeByteOff :: Ptr b -> Int -> CodePoint -> IO () #

peek :: Ptr CodePoint -> IO CodePoint #

poke :: Ptr CodePoint -> CodePoint -> IO () #

Storable DecoderState 
Instance details

Defined in Data.Text.Encoding

Methods

sizeOf :: DecoderState -> Int #

alignment :: DecoderState -> Int #

peekElemOff :: Ptr DecoderState -> Int -> IO DecoderState #

pokeElemOff :: Ptr DecoderState -> Int -> DecoderState -> IO () #

peekByteOff :: Ptr b -> Int -> IO DecoderState #

pokeByteOff :: Ptr b -> Int -> DecoderState -> IO () #

peek :: Ptr DecoderState -> IO DecoderState #

poke :: Ptr DecoderState -> DecoderState -> IO () #

Storable UUID

This Storable instance uses the memory layout as described in RFC 4122, but in contrast to the Binary instance, the fields are stored in host byte order.

Instance details

Defined in Data.UUID.Types.Internal

Methods

sizeOf :: UUID -> Int #

alignment :: UUID -> Int #

peekElemOff :: Ptr UUID -> Int -> IO UUID #

pokeElemOff :: Ptr UUID -> Int -> UUID -> IO () #

peekByteOff :: Ptr b -> Int -> IO UUID #

pokeByteOff :: Ptr b -> Int -> UUID -> IO () #

peek :: Ptr UUID -> IO UUID #

poke :: Ptr UUID -> UUID -> IO () #

Storable ()

Since: base-4.9.0.0

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: () -> Int #

alignment :: () -> Int #

peekElemOff :: Ptr () -> Int -> IO () #

pokeElemOff :: Ptr () -> Int -> () -> IO () #

peekByteOff :: Ptr b -> Int -> IO () #

pokeByteOff :: Ptr b -> Int -> () -> IO () #

peek :: Ptr () -> IO () #

poke :: Ptr () -> () -> IO () #

Storable Bool

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Bool -> Int #

alignment :: Bool -> Int #

peekElemOff :: Ptr Bool -> Int -> IO Bool #

pokeElemOff :: Ptr Bool -> Int -> Bool -> IO () #

peekByteOff :: Ptr b -> Int -> IO Bool #

pokeByteOff :: Ptr b -> Int -> Bool -> IO () #

peek :: Ptr Bool -> IO Bool #

poke :: Ptr Bool -> Bool -> IO () #

Storable Char

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Char -> Int #

alignment :: Char -> Int #

peekElemOff :: Ptr Char -> Int -> IO Char #

pokeElemOff :: Ptr Char -> Int -> Char -> IO () #

peekByteOff :: Ptr b -> Int -> IO Char #

pokeByteOff :: Ptr b -> Int -> Char -> IO () #

peek :: Ptr Char -> IO Char #

poke :: Ptr Char -> Char -> IO () #

Storable Double

Since: base-2.1

Instance details

Defined in Foreign.Storable

Storable Float

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Float -> Int #

alignment :: Float -> Int #

peekElemOff :: Ptr Float -> Int -> IO Float #

pokeElemOff :: Ptr Float -> Int -> Float -> IO () #

peekByteOff :: Ptr b -> Int -> IO Float #

pokeByteOff :: Ptr b -> Int -> Float -> IO () #

peek :: Ptr Float -> IO Float #

poke :: Ptr Float -> Float -> IO () #

Storable Int

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Int -> Int #

alignment :: Int -> Int #

peekElemOff :: Ptr Int -> Int -> IO Int #

pokeElemOff :: Ptr Int -> Int -> Int -> IO () #

peekByteOff :: Ptr b -> Int -> IO Int #

pokeByteOff :: Ptr b -> Int -> Int -> IO () #

peek :: Ptr Int -> IO Int #

poke :: Ptr Int -> Int -> IO () #

Storable Word

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Word -> Int #

alignment :: Word -> Int #

peekElemOff :: Ptr Word -> Int -> IO Word #

pokeElemOff :: Ptr Word -> Int -> Word -> IO () #

peekByteOff :: Ptr b -> Int -> IO Word #

pokeByteOff :: Ptr b -> Int -> Word -> IO () #

peek :: Ptr Word -> IO Word #

poke :: Ptr Word -> Word -> IO () #

Storable a => Storable (Complex a)

Since: base-4.8.0.0

Instance details

Defined in Data.Complex

Methods

sizeOf :: Complex a -> Int #

alignment :: Complex a -> Int #

peekElemOff :: Ptr (Complex a) -> Int -> IO (Complex a) #

pokeElemOff :: Ptr (Complex a) -> Int -> Complex a -> IO () #

peekByteOff :: Ptr b -> Int -> IO (Complex a) #

pokeByteOff :: Ptr b -> Int -> Complex a -> IO () #

peek :: Ptr (Complex a) -> IO (Complex a) #

poke :: Ptr (Complex a) -> Complex a -> IO () #

Storable a => Storable (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

sizeOf :: Identity a -> Int #

alignment :: Identity a -> Int #

peekElemOff :: Ptr (Identity a) -> Int -> IO (Identity a) #

pokeElemOff :: Ptr (Identity a) -> Int -> Identity a -> IO () #

peekByteOff :: Ptr b -> Int -> IO (Identity a) #

pokeByteOff :: Ptr b -> Int -> Identity a -> IO () #

peek :: Ptr (Identity a) -> IO (Identity a) #

poke :: Ptr (Identity a) -> Identity a -> IO () #

Storable a => Storable (Down a)

Since: base-4.14.0.0

Instance details

Defined in Data.Ord

Methods

sizeOf :: Down a -> Int #

alignment :: Down a -> Int #

peekElemOff :: Ptr (Down a) -> Int -> IO (Down a) #

pokeElemOff :: Ptr (Down a) -> Int -> Down a -> IO () #

peekByteOff :: Ptr b -> Int -> IO (Down a) #

pokeByteOff :: Ptr b -> Int -> Down a -> IO () #

peek :: Ptr (Down a) -> IO (Down a) #

poke :: Ptr (Down a) -> Down a -> IO () #

Storable (FunPtr a)

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: FunPtr a -> Int #

alignment :: FunPtr a -> Int #

peekElemOff :: Ptr (FunPtr a) -> Int -> IO (FunPtr a) #

pokeElemOff :: Ptr (FunPtr a) -> Int -> FunPtr a -> IO () #

peekByteOff :: Ptr b -> Int -> IO (FunPtr a) #

pokeByteOff :: Ptr b -> Int -> FunPtr a -> IO () #

peek :: Ptr (FunPtr a) -> IO (FunPtr a) #

poke :: Ptr (FunPtr a) -> FunPtr a -> IO () #

Storable (Ptr a)

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Ptr a -> Int #

alignment :: Ptr a -> Int #

peekElemOff :: Ptr (Ptr a) -> Int -> IO (Ptr a) #

pokeElemOff :: Ptr (Ptr a) -> Int -> Ptr a -> IO () #

peekByteOff :: Ptr b -> Int -> IO (Ptr a) #

pokeByteOff :: Ptr b -> Int -> Ptr a -> IO () #

peek :: Ptr (Ptr a) -> IO (Ptr a) #

poke :: Ptr (Ptr a) -> Ptr a -> IO () #

(Storable a, Integral a) => Storable (Ratio a)

Since: base-4.8.0.0

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Ratio a -> Int #

alignment :: Ratio a -> Int #

peekElemOff :: Ptr (Ratio a) -> Int -> IO (Ratio a) #

pokeElemOff :: Ptr (Ratio a) -> Int -> Ratio a -> IO () #

peekByteOff :: Ptr b -> Int -> IO (Ratio a) #

pokeByteOff :: Ptr b -> Int -> Ratio a -> IO () #

peek :: Ptr (Ratio a) -> IO (Ratio a) #

poke :: Ptr (Ratio a) -> Ratio a -> IO () #

Storable (StablePtr a)

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: StablePtr a -> Int #

alignment :: StablePtr a -> Int #

peekElemOff :: Ptr (StablePtr a) -> Int -> IO (StablePtr a) #

pokeElemOff :: Ptr (StablePtr a) -> Int -> StablePtr a -> IO () #

peekByteOff :: Ptr b -> Int -> IO (StablePtr a) #

pokeByteOff :: Ptr b -> Int -> StablePtr a -> IO () #

peek :: Ptr (StablePtr a) -> IO (StablePtr a) #

poke :: Ptr (StablePtr a) -> StablePtr a -> IO () #

Prim a => Storable (PrimStorable a) 
Instance details

Defined in Data.Primitive.Types

Storable g => Storable (StateGen g) 
Instance details

Defined in System.Random.Internal

Methods

sizeOf :: StateGen g -> Int #

alignment :: StateGen g -> Int #

peekElemOff :: Ptr (StateGen g) -> Int -> IO (StateGen g) #

pokeElemOff :: Ptr (StateGen g) -> Int -> StateGen g -> IO () #

peekByteOff :: Ptr b -> Int -> IO (StateGen g) #

pokeByteOff :: Ptr b -> Int -> StateGen g -> IO () #

peek :: Ptr (StateGen g) -> IO (StateGen g) #

poke :: Ptr (StateGen g) -> StateGen g -> IO () #

Storable g => Storable (AtomicGen g) 
Instance details

Defined in System.Random.Stateful

Methods

sizeOf :: AtomicGen g -> Int #

alignment :: AtomicGen g -> Int #

peekElemOff :: Ptr (AtomicGen g) -> Int -> IO (AtomicGen g) #

pokeElemOff :: Ptr (AtomicGen g) -> Int -> AtomicGen g -> IO () #

peekByteOff :: Ptr b -> Int -> IO (AtomicGen g) #

pokeByteOff :: Ptr b -> Int -> AtomicGen g -> IO () #

peek :: Ptr (AtomicGen g) -> IO (AtomicGen g) #

poke :: Ptr (AtomicGen g) -> AtomicGen g -> IO () #

Storable g => Storable (IOGen g) 
Instance details

Defined in System.Random.Stateful

Methods

sizeOf :: IOGen g -> Int #

alignment :: IOGen g -> Int #

peekElemOff :: Ptr (IOGen g) -> Int -> IO (IOGen g) #

pokeElemOff :: Ptr (IOGen g) -> Int -> IOGen g -> IO () #

peekByteOff :: Ptr b -> Int -> IO (IOGen g) #

pokeByteOff :: Ptr b -> Int -> IOGen g -> IO () #

peek :: Ptr (IOGen g) -> IO (IOGen g) #

poke :: Ptr (IOGen g) -> IOGen g -> IO () #

Storable g => Storable (STGen g) 
Instance details

Defined in System.Random.Stateful

Methods

sizeOf :: STGen g -> Int #

alignment :: STGen g -> Int #

peekElemOff :: Ptr (STGen g) -> Int -> IO (STGen g) #

pokeElemOff :: Ptr (STGen g) -> Int -> STGen g -> IO () #

peekByteOff :: Ptr b -> Int -> IO (STGen g) #

pokeByteOff :: Ptr b -> Int -> STGen g -> IO () #

peek :: Ptr (STGen g) -> IO (STGen g) #

poke :: Ptr (STGen g) -> STGen g -> IO () #

Storable g => Storable (TGen g) 
Instance details

Defined in System.Random.Stateful

Methods

sizeOf :: TGen g -> Int #

alignment :: TGen g -> Int #

peekElemOff :: Ptr (TGen g) -> Int -> IO (TGen g) #

pokeElemOff :: Ptr (TGen g) -> Int -> TGen g -> IO () #

peekByteOff :: Ptr b -> Int -> IO (TGen g) #

pokeByteOff :: Ptr b -> Int -> TGen g -> IO () #

peek :: Ptr (TGen g) -> IO (TGen g) #

poke :: Ptr (TGen g) -> TGen g -> IO () #

Storable a => Storable (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

sizeOf :: Const a b -> Int #

alignment :: Const a b -> Int #

peekElemOff :: Ptr (Const a b) -> Int -> IO (Const a b) #

pokeElemOff :: Ptr (Const a b) -> Int -> Const a b -> IO () #

peekByteOff :: Ptr b0 -> Int -> IO (Const a b) #

pokeByteOff :: Ptr b0 -> Int -> Const a b -> IO () #

peek :: Ptr (Const a b) -> IO (Const a b) #

poke :: Ptr (Const a b) -> Const a b -> IO () #

Storable a => Storable (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

sizeOf :: Tagged s a -> Int #

alignment :: Tagged s a -> Int #

peekElemOff :: Ptr (Tagged s a) -> Int -> IO (Tagged s a) #

pokeElemOff :: Ptr (Tagged s a) -> Int -> Tagged s a -> IO () #

peekByteOff :: Ptr b -> Int -> IO (Tagged s a) #

pokeByteOff :: Ptr b -> Int -> Tagged s a -> IO () #

peek :: Ptr (Tagged s a) -> IO (Tagged s a) #

poke :: Ptr (Tagged s a) -> Tagged s a -> IO () #

readMaybe :: Read a => String -> Maybe a #

Parse a string using the Read instance. Succeeds if there is exactly one valid result.

>>> readMaybe "123" :: Maybe Int
Just 123
>>> readMaybe "hello" :: Maybe Int
Nothing

Since: base-4.6.0.0

rights :: [Either a b] -> [b] #

Extracts from a list of Either all the Right elements. All the Right elements are extracted in order.

Examples

Expand

Basic usage:

>>> let list = [ Left "foo", Right 3, Left "bar", Right 7, Left "baz" ]
>>> rights list
[3,7]

partitionEithers :: [Either a b] -> ([a], [b]) #

Partitions a list of Either into two lists. All the Left elements are extracted, in order, to the first component of the output. Similarly the Right elements are extracted to the second component of the output.

Examples

Expand

Basic usage:

>>> let list = [ Left "foo", Right 3, Left "bar", Right 7, Left "baz" ]
>>> partitionEithers list
(["foo","bar","baz"],[3,7])

The pair returned by partitionEithers x should be the same pair as (lefts x, rights x):

>>> let list = [ Left "foo", Right 3, Left "bar", Right 7, Left "baz" ]
>>> partitionEithers list == (lefts list, rights list)
True

lefts :: [Either a b] -> [a] #

Extracts from a list of Either all the Left elements. All the Left elements are extracted in order.

Examples

Expand

Basic usage:

>>> let list = [ Left "foo", Right 3, Left "bar", Right 7, Left "baz" ]
>>> lefts list
["foo","bar","baz"]

isRight :: Either a b -> Bool #

Return True if the given value is a Right-value, False otherwise.

Examples

Expand

Basic usage:

>>> isRight (Left "foo")
False
>>> isRight (Right 3)
True

Assuming a Left value signifies some sort of error, we can use isRight to write a very simple reporting function that only outputs "SUCCESS" when a computation has succeeded.

This example shows how isRight might be used to avoid pattern matching when one does not care about the value contained in the constructor:

>>> import Control.Monad ( when )
>>> let report e = when (isRight e) $ putStrLn "SUCCESS"
>>> report (Left "parse error")
>>> report (Right 1)
SUCCESS

Since: base-4.7.0.0

isLeft :: Either a b -> Bool #

Return True if the given value is a Left-value, False otherwise.

Examples

Expand

Basic usage:

>>> isLeft (Left "foo")
True
>>> isLeft (Right 3)
False

Assuming a Left value signifies some sort of error, we can use isLeft to write a very simple error-reporting function that does absolutely nothing in the case of success, and outputs "ERROR" if any error occurred.

This example shows how isLeft might be used to avoid pattern matching when one does not care about the value contained in the constructor:

>>> import Control.Monad ( when )
>>> let report e = when (isLeft e) $ putStrLn "ERROR"
>>> report (Right 1)
>>> report (Left "parse error")
ERROR

Since: base-4.7.0.0

fromRight :: b -> Either a b -> b #

Return the contents of a Right-value or a default value otherwise.

Examples

Expand

Basic usage:

>>> fromRight 1 (Right 3)
3
>>> fromRight 1 (Left "foo")
1

Since: base-4.10.0.0

fromLeft :: a -> Either a b -> a #

Return the contents of a Left-value or a default value otherwise.

Examples

Expand

Basic usage:

>>> fromLeft 1 (Left 3)
3
>>> fromLeft 1 (Right "foo")
1

Since: base-4.10.0.0

class Category (cat :: k -> k -> Type) #

A class for categories. Instances should satisfy the laws

Right identity
f . id = f
Left identity
id . f = f
Associativity
f . (g . h) = (f . g) . h

Minimal complete definition

id, (.)

Instances

Instances details
Category Op 
Instance details

Defined in Data.Functor.Contravariant

Methods

id :: forall (a :: k). Op a a #

(.) :: forall (b :: k) (c :: k) (a :: k). Op b c -> Op a b -> Op a c #

Monad m => Category (Kleisli m :: Type -> Type -> TYPE LiftedRep)

Since: base-3.0

Instance details

Defined in Control.Arrow

Methods

id :: forall (a :: k). Kleisli m a a #

(.) :: forall (b :: k) (c :: k) (a :: k). Kleisli m b c -> Kleisli m a b -> Kleisli m a c #

(Applicative f, Monad f) => Category (WhenMissing f :: Type -> Type -> Type)

Since: containers-0.5.9

Instance details

Defined in Data.IntMap.Internal

Methods

id :: forall (a :: k). WhenMissing f a a #

(.) :: forall (b :: k) (c :: k) (a :: k). WhenMissing f b c -> WhenMissing f a b -> WhenMissing f a c #

Category (Indexed i :: Type -> Type -> TYPE LiftedRep) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

id :: forall (a :: k). Indexed i a a #

(.) :: forall (b :: k) (c :: k) (a :: k). Indexed i b c -> Indexed i a b -> Indexed i a c #

Category p => Category (TambaraSum p :: Type -> Type -> Type) 
Instance details

Defined in Data.Profunctor.Choice

Methods

id :: forall (a :: k). TambaraSum p a a #

(.) :: forall (b :: k) (c :: k) (a :: k). TambaraSum p b c -> TambaraSum p a b -> TambaraSum p a c #

Category (Coercion :: k -> k -> Type)

Since: base-4.7.0.0

Instance details

Defined in Control.Category

Methods

id :: forall (a :: k0). Coercion a a #

(.) :: forall (b :: k0) (c :: k0) (a :: k0). Coercion b c -> Coercion a b -> Coercion a c #

Category ((:~:) :: k -> k -> Type)

Since: base-4.7.0.0

Instance details

Defined in Control.Category

Methods

id :: forall (a :: k0). a :~: a #

(.) :: forall (b :: k0) (c :: k0) (a :: k0). (b :~: c) -> (a :~: b) -> a :~: c #

(Monad f, Applicative f) => Category (WhenMatched f x :: Type -> Type -> TYPE LiftedRep)

Since: containers-0.5.9

Instance details

Defined in Data.IntMap.Internal

Methods

id :: forall (a :: k). WhenMatched f x a a #

(.) :: forall (b :: k) (c :: k) (a :: k). WhenMatched f x b c -> WhenMatched f x a b -> WhenMatched f x a c #

(Applicative f, Monad f) => Category (WhenMissing f k :: Type -> Type -> Type)

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

id :: forall (a :: k0). WhenMissing f k a a #

(.) :: forall (b :: k0) (c :: k0) (a :: k0). WhenMissing f k b c -> WhenMissing f k a b -> WhenMissing f k a c #

Category (->)

Since: base-3.0

Instance details

Defined in Control.Category

Methods

id :: forall (a :: k). a -> a #

(.) :: forall (b :: k) (c :: k) (a :: k). (b -> c) -> (a -> b) -> a -> c #

Category ((:~~:) :: k -> k -> Type)

Since: base-4.10.0.0

Instance details

Defined in Control.Category

Methods

id :: forall (a :: k0). a :~~: a #

(.) :: forall (b :: k0) (c :: k0) (a :: k0). (b :~~: c) -> (a :~~: b) -> a :~~: c #

(Monad f, Applicative f) => Category (WhenMatched f k x :: Type -> Type -> TYPE LiftedRep)

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

id :: forall (a :: k0). WhenMatched f k x a a #

(.) :: forall (b :: k0) (c :: k0) (a :: k0). WhenMatched f k x b c -> WhenMatched f k x a b -> WhenMatched f k x a c #

(Category p, Category q) => Category (Product p q :: k -> k -> Type) 
Instance details

Defined in Data.Bifunctor.Product

Methods

id :: forall (a :: k0). Product p q a a #

(.) :: forall (b :: k0) (c :: k0) (a :: k0). Product p q b c -> Product p q a b -> Product p q a c #

(Applicative f, Category p) => Category (Tannen f p :: k -> k -> Type) 
Instance details

Defined in Data.Bifunctor.Tannen

Methods

id :: forall (a :: k0). Tannen f p a a #

(.) :: forall (b :: k0) (c :: k0) (a :: k0). Tannen f p b c -> Tannen f p a b -> Tannen f p a c #

p ~ q => Category (Rift p q :: k1 -> k1 -> TYPE LiftedRep)

Rift p p forms a Monad in the Profunctor 2-category, which is isomorphic to a Haskell Category instance.

Instance details

Defined in Data.Profunctor.Composition

Methods

id :: forall (a :: k). Rift p q a a #

(.) :: forall (b :: k) (c :: k) (a :: k). Rift p q b c -> Rift p q a b -> Rift p q a c #

Category ReifiedFold 
Instance details

Defined in Control.Lens.Reified

Methods

id :: forall (a :: k). ReifiedFold a a #

(.) :: forall (b :: k) (c :: k) (a :: k). ReifiedFold b c -> ReifiedFold a b -> ReifiedFold a c #

Category ReifiedGetter 
Instance details

Defined in Control.Lens.Reified

Methods

id :: forall (a :: k). ReifiedGetter a a #

(.) :: forall (b :: k) (c :: k) (a :: k). ReifiedGetter b c -> ReifiedGetter a b -> ReifiedGetter a c #

(>>>) :: forall {k} cat (a :: k) (b :: k) (c :: k). Category cat => cat a b -> cat b c -> cat a c infixr 1 #

Left-to-right composition

data IOMode #

Instances

Instances details
Enum IOMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.IOMode

Ix IOMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.IOMode

Read IOMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.IOMode

Show IOMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.IOMode

Eq IOMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.IOMode

Methods

(==) :: IOMode -> IOMode -> Bool #

(/=) :: IOMode -> IOMode -> Bool #

Ord IOMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.IOMode

byteSwap64 :: Word64 -> Word64 #

Reverse order of bytes in Word64.

Since: base-4.7.0.0

byteSwap32 :: Word32 -> Word32 #

Reverse order of bytes in Word32.

Since: base-4.7.0.0

byteSwap16 :: Word16 -> Word16 #

Reverse order of bytes in Word16.

Since: base-4.7.0.0

runST :: (forall s. ST s a) -> a #

Return the value computed by a state thread. The forall ensures that the internal state used by the ST computation is inaccessible to the rest of the program.

bool :: a -> a -> Bool -> a #

Case analysis for the Bool type. bool x y p evaluates to x when p is False, and evaluates to y when p is True.

This is equivalent to if p then y else x; that is, one can think of it as an if-then-else construct with its arguments reordered.

Examples

Expand

Basic usage:

>>> bool "foo" "bar" True
"bar"
>>> bool "foo" "bar" False
"foo"

Confirm that bool x y p and if p then y else x are equivalent:

>>> let p = True; x = "bar"; y = "foo"
>>> bool x y p == if p then y else x
True
>>> let p = False
>>> bool x y p == if p then y else x
True

Since: base-4.7.0.0

on :: (b -> b -> c) -> (a -> b) -> a -> a -> c infixl 0 #

on b u x y runs the binary function b on the results of applying unary function u to two arguments x and y. From the opposite perspective, it transforms two inputs and combines the outputs.

((+) `on` f) x y = f x + f y

Typical usage: sortBy (compare `on` fst).

Algebraic properties:

  • (*) `on` id = (*) -- (if (*) ∉ {⊥, const ⊥})
  • ((*) `on` f) `on` g = (*) `on` (f . g)
  • flip on f . flip on g = flip on (g . f)

fix :: (a -> a) -> a #

fix f is the least fixed point of the function f, i.e. the least defined x such that f x = x.

For example, we can write the factorial function using direct recursion as

>>> let fac n = if n <= 1 then 1 else n * fac (n-1) in fac 5
120

This uses the fact that Haskell’s let introduces recursive bindings. We can rewrite this definition using fix,

>>> fix (\rec n -> if n <= 1 then 1 else n * rec (n-1)) 5
120

Instead of making a recursive call, we introduce a dummy parameter rec; when used within fix, this parameter then refers to fix’s argument, hence the recursion is reintroduced.

($>) :: Functor f => f a -> b -> f b infixl 4 #

Flipped version of <$.

Examples

Expand

Replace the contents of a Maybe Int with a constant String:

>>> Nothing $> "foo"
Nothing
>>> Just 90210 $> "foo"
Just "foo"

Replace the contents of an Either Int Int with a constant String, resulting in an Either Int String:

>>> Left 8675309 $> "foo"
Left 8675309
>>> Right 8675309 $> "foo"
Right "foo"

Replace each element of a list with a constant String:

>>> [1,2,3] $> "foo"
["foo","foo","foo"]

Replace the second element of a pair with a constant String:

>>> (1,2) $> "foo"
(1,"foo")

Since: base-4.7.0.0

data MVar a #

An MVar (pronounced "em-var") is a synchronising variable, used for communication between concurrent threads. It can be thought of as a box, which may be empty or full.

Instances

Instances details
NFData1 MVar

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> MVar a -> () #

NFData (MVar a)

NOTE: Only strict in the reference and not the referenced value.

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: MVar a -> () #

Eq (MVar a)

Since: base-4.1.0.0

Instance details

Defined in GHC.MVar

Methods

(==) :: MVar a -> MVar a -> Bool #

(/=) :: MVar a -> MVar a -> Bool #

liftA3 :: Applicative f => (a -> b -> c -> d) -> f a -> f b -> f c -> f d #

Lift a ternary function to actions.

liftA :: Applicative f => (a -> b) -> f a -> f b #

Lift a function to actions. Equivalent to Functor's fmap but implemented using only Applicative's methods: `liftA f a = pure f * a`

As such this function may be used to implement a Functor instance from an Applicative one.

type HasCallStack = ?callStack :: CallStack #

Request a CallStack.

NOTE: The implicit parameter ?callStack :: CallStack is an implementation detail and should not be considered part of the CallStack API, we may decide to change the implementation in the future.

Since: base-4.9.0.0

data ShortByteString #

A compact representation of a Word8 vector.

It has a lower memory overhead than a ByteString and does not contribute to heap fragmentation. It can be converted to or from a ByteString (at the cost of copying the string data). It supports very few other operations.

It is suitable for use as an internal representation for code that needs to keep many short strings in memory, but it should not be used as an interchange type. That is, it should not generally be used in public APIs. The ByteString type is usually more suitable for use in interfaces; it is more flexible and it supports a wide range of operations.

Instances

Instances details
Data ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ShortByteString -> c ShortByteString #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ShortByteString #

toConstr :: ShortByteString -> Constr #

dataTypeOf :: ShortByteString -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ShortByteString) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ShortByteString) #

gmapT :: (forall b. Data b => b -> b) -> ShortByteString -> ShortByteString #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ShortByteString -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ShortByteString -> r #

gmapQ :: (forall d. Data d => d -> u) -> ShortByteString -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ShortByteString -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ShortByteString -> m ShortByteString #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ShortByteString -> m ShortByteString #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ShortByteString -> m ShortByteString #

IsString ShortByteString

Beware: fromString truncates multi-byte characters to octets. e.g. "枯朶に烏のとまりけり秋の暮" becomes �6k�nh~�Q��n�

Instance details

Defined in Data.ByteString.Short.Internal

Monoid ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Semigroup ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

IsList ShortByteString

Since: bytestring-0.10.12.0

Instance details

Defined in Data.ByteString.Short.Internal

Associated Types

type Item ShortByteString #

Read ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Show ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

NFData ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Methods

rnf :: ShortByteString -> () #

ToLogStr ShortByteString 
Instance details

Defined in System.Log.FastLogger.LogStr

Eq ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Ord ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Hashable ShortByteString 
Instance details

Defined in Data.Hashable.Class

Lift ShortByteString

Since: bytestring-0.11.2.0

Instance details

Defined in Data.ByteString.Short.Internal

Methods

lift :: Quote m => ShortByteString -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => ShortByteString -> Code m ShortByteString #

type Item ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

toShort :: ByteString -> ShortByteString #

O(n). Convert a ByteString into a ShortByteString.

This makes a copy, so does not retain the input string.

class Monad m => MonadThrow (m :: Type -> Type) where #

A class for monads in which exceptions may be thrown.

Instances should obey the following law:

throwM e >> x = throwM e

In other words, throwing an exception short-circuits the rest of the monadic computation.

Methods

throwM :: Exception e => e -> m a #

Throw an exception. Note that this throws when this action is run in the monad m, not when it is applied. It is a generalization of Control.Exception's throwIO.

Should satisfy the law:

throwM e >> f = throwM e

Instances

Instances details
MonadThrow STM 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> STM a #

MonadThrow IO 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> IO a #

MonadThrow Q 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> Q a #

MonadThrow Maybe 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> Maybe a #

MonadThrow [] 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> [a] #

e ~ SomeException => MonadThrow (Either e) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e0 => e0 -> Either e a #

MonadThrow (ST s) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> ST s a #

MonadThrow m => MonadThrow (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

throwM :: Exception e => e -> LoggingT m a #

MonadThrow m => MonadThrow (NoLoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

throwM :: Exception e => e -> NoLoggingT m a #

MonadThrow m => MonadThrow (WriterLoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

throwM :: Exception e => e -> WriterLoggingT m a #

MonadThrow m => MonadThrow (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

throwM :: Exception e => e -> ResourceT m a #

MonadThrow (RIO env) 
Instance details

Defined in RIO.Prelude.RIO

Methods

throwM :: Exception e => e -> RIO env a #

MonadThrow m => MonadThrow (ListT m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> ListT m a #

MonadThrow m => MonadThrow (MaybeT m)

Throws exceptions into the base monad.

Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> MaybeT m a #

(Functor f, MonadThrow m) => MonadThrow (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

throwM :: Exception e => e -> FreeT f m a #

MonadThrow m => MonadThrow (AppT app m) Source # 
Instance details

Defined in Stackctl.CLI

Methods

throwM :: Exception e => e -> AppT app m a #

(Error e, MonadThrow m) => MonadThrow (ErrorT e m)

Throws exceptions into the base monad.

Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e0 => e0 -> ErrorT e m a #

MonadThrow m => MonadThrow (ExceptT e m)

Throws exceptions into the base monad.

Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e0 => e0 -> ExceptT e m a #

MonadThrow m => MonadThrow (IdentityT m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> IdentityT m a #

MonadThrow m => MonadThrow (ReaderT r m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> ReaderT r m a #

MonadThrow m => MonadThrow (StateT s m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> StateT s m a #

MonadThrow m => MonadThrow (StateT s m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> StateT s m a #

(MonadThrow m, Monoid w) => MonadThrow (WriterT w m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> WriterT w m a #

(MonadThrow m, Monoid w) => MonadThrow (WriterT w m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> WriterT w m a #

MonadThrow m => MonadThrow (ConduitT i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

throwM :: Exception e => e -> ConduitT i o m a #

MonadThrow m => MonadThrow (ContT r m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> ContT r m a #

(MonadThrow m, Monoid w) => MonadThrow (RWST r w s m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> RWST r w s m a #

(MonadThrow m, Monoid w) => MonadThrow (RWST r w s m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> RWST r w s m a #

MonadThrow m => MonadThrow (Pipe l i o u m) 
Instance details

Defined in Data.Conduit.Internal.Pipe

Methods

throwM :: Exception e => e -> Pipe l i o u m a #

type family PrimState (m :: Type -> Type) #

State token type.

Instances

Instances details
type PrimState IO 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ST s) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ST s) = s
type PrimState (ST s) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ST s) = s
type PrimState (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

type PrimState (RIO env) 
Instance details

Defined in RIO.Prelude.RIO

type PrimState (RIO env) = PrimState IO
type PrimState (ListT m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (MaybeT m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (AccumT w m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (AccumT w m) = PrimState m
type PrimState (ErrorT e m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ErrorT e m) = PrimState m
type PrimState (ExceptT e m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ExceptT e m) = PrimState m
type PrimState (IdentityT m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ReaderT r m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ReaderT r m) = PrimState m
type PrimState (SelectT r m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (SelectT r m) = PrimState m
type PrimState (StateT s m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (StateT s m) = PrimState m
type PrimState (StateT s m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (StateT s m) = PrimState m
type PrimState (WriterT w m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (WriterT w m) = PrimState m
type PrimState (WriterT w m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (WriterT w m) = PrimState m
type PrimState (WriterT w m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (WriterT w m) = PrimState m
type PrimState (ConduitT i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

type PrimState (ConduitT i o m) = PrimState m
type PrimState (ContT r m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ContT r m) = PrimState m
type PrimState (RWST r w s m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (RWST r w s m) = PrimState m
type PrimState (RWST r w s m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (RWST r w s m) = PrimState m
type PrimState (RWST r w s m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (RWST r w s m) = PrimState m
type PrimState (Pipe l i o u m) 
Instance details

Defined in Data.Conduit.Internal.Pipe

type PrimState (Pipe l i o u m) = PrimState m

class Monad m => PrimMonad (m :: Type -> Type) where #

Class of monads which can perform primitive state-transformer actions.

Associated Types

type PrimState (m :: Type -> Type) #

State token type.

Methods

primitive :: (State# (PrimState m) -> (# State# (PrimState m), a #)) -> m a #

Execute a primitive operation.

Instances

Instances details
PrimMonad IO 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState IO #

Methods

primitive :: (State# (PrimState IO) -> (# State# (PrimState IO), a #)) -> IO a #

PrimMonad (ST s) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (ST s) #

Methods

primitive :: (State# (PrimState (ST s)) -> (# State# (PrimState (ST s)), a #)) -> ST s a #

PrimMonad (ST s) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (ST s) #

Methods

primitive :: (State# (PrimState (ST s)) -> (# State# (PrimState (ST s)), a #)) -> ST s a #

PrimMonad m => PrimMonad (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Associated Types

type PrimState (ResourceT m) #

Methods

primitive :: (State# (PrimState (ResourceT m)) -> (# State# (PrimState (ResourceT m)), a #)) -> ResourceT m a #

PrimMonad (RIO env) 
Instance details

Defined in RIO.Prelude.RIO

Associated Types

type PrimState (RIO env) #

Methods

primitive :: (State# (PrimState (RIO env)) -> (# State# (PrimState (RIO env)), a #)) -> RIO env a #

PrimMonad m => PrimMonad (ListT m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (ListT m) #

Methods

primitive :: (State# (PrimState (ListT m)) -> (# State# (PrimState (ListT m)), a #)) -> ListT m a #

PrimMonad m => PrimMonad (MaybeT m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (MaybeT m) #

Methods

primitive :: (State# (PrimState (MaybeT m)) -> (# State# (PrimState (MaybeT m)), a #)) -> MaybeT m a #

(Monoid w, PrimMonad m) => PrimMonad (AccumT w m)

Since: primitive-0.6.3.0

Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (AccumT w m) #

Methods

primitive :: (State# (PrimState (AccumT w m)) -> (# State# (PrimState (AccumT w m)), a #)) -> AccumT w m a #

(Error e, PrimMonad m) => PrimMonad (ErrorT e m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (ErrorT e m) #

Methods

primitive :: (State# (PrimState (ErrorT e m)) -> (# State# (PrimState (ErrorT e m)), a #)) -> ErrorT e m a #

PrimMonad m => PrimMonad (ExceptT e m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (ExceptT e m) #

Methods

primitive :: (State# (PrimState (ExceptT e m)) -> (# State# (PrimState (ExceptT e m)), a #)) -> ExceptT e m a #

PrimMonad m => PrimMonad (IdentityT m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (IdentityT m) #

Methods

primitive :: (State# (PrimState (IdentityT m)) -> (# State# (PrimState (IdentityT m)), a #)) -> IdentityT m a #

PrimMonad m => PrimMonad (ReaderT r m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (ReaderT r m) #

Methods

primitive :: (State# (PrimState (ReaderT r m)) -> (# State# (PrimState (ReaderT r m)), a #)) -> ReaderT r m a #

PrimMonad m => PrimMonad (SelectT r m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (SelectT r m) #

Methods

primitive :: (State# (PrimState (SelectT r m)) -> (# State# (PrimState (SelectT r m)), a #)) -> SelectT r m a #

PrimMonad m => PrimMonad (StateT s m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (StateT s m) #

Methods

primitive :: (State# (PrimState (StateT s m)) -> (# State# (PrimState (StateT s m)), a #)) -> StateT s m a #

PrimMonad m => PrimMonad (StateT s m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (StateT s m) #

Methods

primitive :: (State# (PrimState (StateT s m)) -> (# State# (PrimState (StateT s m)), a #)) -> StateT s m a #

(Monoid w, PrimMonad m) => PrimMonad (WriterT w m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (WriterT w m) #

Methods

primitive :: (State# (PrimState (WriterT w m)) -> (# State# (PrimState (WriterT w m)), a #)) -> WriterT w m a #

(Monoid w, PrimMonad m) => PrimMonad (WriterT w m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (WriterT w m) #

Methods

primitive :: (State# (PrimState (WriterT w m)) -> (# State# (PrimState (WriterT w m)), a #)) -> WriterT w m a #

(Monoid w, PrimMonad m) => PrimMonad (WriterT w m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (WriterT w m) #

Methods

primitive :: (State# (PrimState (WriterT w m)) -> (# State# (PrimState (WriterT w m)), a #)) -> WriterT w m a #

PrimMonad m => PrimMonad (ConduitT i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Associated Types

type PrimState (ConduitT i o m) #

Methods

primitive :: (State# (PrimState (ConduitT i o m)) -> (# State# (PrimState (ConduitT i o m)), a #)) -> ConduitT i o m a #

PrimMonad m => PrimMonad (ContT r m)

Since: primitive-0.6.3.0

Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (ContT r m) #

Methods

primitive :: (State# (PrimState (ContT r m)) -> (# State# (PrimState (ContT r m)), a #)) -> ContT r m a #

(Monoid w, PrimMonad m) => PrimMonad (RWST r w s m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (RWST r w s m) #

Methods

primitive :: (State# (PrimState (RWST r w s m)) -> (# State# (PrimState (RWST r w s m)), a #)) -> RWST r w s m a #

(Monoid w, PrimMonad m) => PrimMonad (RWST r w s m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (RWST r w s m) #

Methods

primitive :: (State# (PrimState (RWST r w s m)) -> (# State# (PrimState (RWST r w s m)), a #)) -> RWST r w s m a #

(Monoid w, PrimMonad m) => PrimMonad (RWST r w s m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (RWST r w s m) #

Methods

primitive :: (State# (PrimState (RWST r w s m)) -> (# State# (PrimState (RWST r w s m)), a #)) -> RWST r w s m a #

PrimMonad m => PrimMonad (Pipe l i o u m) 
Instance details

Defined in Data.Conduit.Internal.Pipe

Associated Types

type PrimState (Pipe l i o u m) #

Methods

primitive :: (State# (PrimState (Pipe l i o u m)) -> (# State# (PrimState (Pipe l i o u m)), a #)) -> Pipe l i o u m a #

throwIO :: (MonadIO m, Exception e) => e -> m a #

Synchronously throw the given exception.

Note that, if you provide an exception value which is of an asynchronous type, it will be wrapped up in SyncExceptionWrapper. See toSyncException.

Since: unliftio-0.1.0.0

unpack :: Text -> String #

O(n) Convert a Text into a String. Subject to fusion.

encodeUtf8 :: Text -> ByteString #

Encode text using UTF-8 encoding.

pack :: String -> Text #

O(n) Convert a String into a Text. Subject to fusion. Performs replacement on invalid scalar values.

class MonadIO m => MonadUnliftIO (m :: Type -> Type) where #

Monads which allow their actions to be run in IO.

While MonadIO allows an IO action to be lifted into another monad, this class captures the opposite concept: allowing you to capture the monadic context. Note that, in order to meet the laws given below, the intuition is that a monad must have no monadic state, but may have monadic context. This essentially limits MonadUnliftIO to ReaderT and IdentityT transformers on top of IO.

Laws. For any function run provided by withRunInIO, it must meet the monad transformer laws as reformulated for MonadUnliftIO:

  • run . return = return
  • run (m >>= f) = run m >>= run . f

Instances of MonadUnliftIO must also satisfy the following laws:

Identity law
withRunInIO (\run -> run m) = m
Inverse law
withRunInIO (\_ -> m) = liftIO m

As an example of an invalid instance, a naive implementation of MonadUnliftIO (StateT s m) might be

withRunInIO inner =
  StateT $ \s ->
    withRunInIO $ \run ->
      inner (run . flip evalStateT s)

This breaks the identity law because the inner run m would throw away any state changes in m.

Since: unliftio-core-0.1.0.0

Methods

withRunInIO :: ((forall a. m a -> IO a) -> IO b) -> m b #

Convenience function for capturing the monadic context and running an IO action with a runner function. The runner function is used to run a monadic action m in IO.

Since: unliftio-core-0.1.0.0

Instances

Instances details
MonadUnliftIO IO 
Instance details

Defined in Control.Monad.IO.Unlift

Methods

withRunInIO :: ((forall a. IO a -> IO a) -> IO b) -> IO b #

MonadUnliftIO m => MonadUnliftIO (LoggingT m)

Since: monad-logger-0.3.26

Instance details

Defined in Control.Monad.Logger

Methods

withRunInIO :: ((forall a. LoggingT m a -> IO a) -> IO b) -> LoggingT m b #

MonadUnliftIO m => MonadUnliftIO (NoLoggingT m)

Since: monad-logger-0.3.26

Instance details

Defined in Control.Monad.Logger

Methods

withRunInIO :: ((forall a. NoLoggingT m a -> IO a) -> IO b) -> NoLoggingT m b #

MonadUnliftIO m => MonadUnliftIO (ResourceT m)

Since: resourcet-1.1.10

Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

withRunInIO :: ((forall a. ResourceT m a -> IO a) -> IO b) -> ResourceT m b #

MonadUnliftIO (RIO env) 
Instance details

Defined in RIO.Prelude.RIO

Methods

withRunInIO :: ((forall a. RIO env a -> IO a) -> IO b) -> RIO env b #

MonadUnliftIO m => MonadUnliftIO (AppT app m) Source # 
Instance details

Defined in Stackctl.CLI

Methods

withRunInIO :: ((forall a. AppT app m a -> IO a) -> IO b) -> AppT app m b #

MonadUnliftIO m => MonadUnliftIO (IdentityT m) 
Instance details

Defined in Control.Monad.IO.Unlift

Methods

withRunInIO :: ((forall a. IdentityT m a -> IO a) -> IO b) -> IdentityT m b #

MonadUnliftIO m => MonadUnliftIO (ReaderT r m) 
Instance details

Defined in Control.Monad.IO.Unlift

Methods

withRunInIO :: ((forall a. ReaderT r m a -> IO a) -> IO b) -> ReaderT r m b #

newtype ReaderT r (m :: Type -> Type) a #

The reader monad transformer, which adds a read-only environment to the given monad.

The return function ignores the environment, while >>= passes the inherited environment to both subcomputations.

Constructors

ReaderT 

Fields

Instances

Instances details
MonadBaseControl b m => MonadBaseControl b (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Control

Associated Types

type StM (ReaderT r m) a #

Methods

liftBaseWith :: (RunInBase (ReaderT r m) b -> b a) -> ReaderT r m a #

restoreM :: StM (ReaderT r m) a -> ReaderT r m a #

MonadError e m => MonadError e (ReaderT r m) 
Instance details

Defined in Control.Monad.Error.Class

Methods

throwError :: e -> ReaderT r m a #

catchError :: ReaderT r m a -> (e -> ReaderT r m a) -> ReaderT r m a #

Monad m => MonadReader r (ReaderT r m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: ReaderT r m r #

local :: (r -> r) -> ReaderT r m a -> ReaderT r m a #

reader :: (r -> a) -> ReaderT r m a #

MonadTransControl (ReaderT r) 
Instance details

Defined in Control.Monad.Trans.Control

Associated Types

type StT (ReaderT r) a #

Methods

liftWith :: Monad m => (Run (ReaderT r) -> m a) -> ReaderT r m a #

restoreT :: Monad m => m (StT (ReaderT r) a) -> ReaderT r m a #

MonadTrans (ReaderT r) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

lift :: Monad m => m a -> ReaderT r m a #

Representable m => Representable (ReaderT e m) 
Instance details

Defined in Data.Functor.Rep

Associated Types

type Rep (ReaderT e m) #

Methods

tabulate :: (Rep (ReaderT e m) -> a) -> ReaderT e m a #

index :: ReaderT e m a -> Rep (ReaderT e m) -> a #

MonadFail m => MonadFail (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

fail :: String -> ReaderT r m a #

MonadFix m => MonadFix (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

mfix :: (a -> ReaderT r m a) -> ReaderT r m a #

MonadIO m => MonadIO (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

liftIO :: IO a -> ReaderT r m a #

MonadZip m => MonadZip (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

mzip :: ReaderT r m a -> ReaderT r m b -> ReaderT r m (a, b) #

mzipWith :: (a -> b -> c) -> ReaderT r m a -> ReaderT r m b -> ReaderT r m c #

munzip :: ReaderT r m (a, b) -> (ReaderT r m a, ReaderT r m b) #

Contravariant m => Contravariant (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

contramap :: (a' -> a) -> ReaderT r m a -> ReaderT r m a' #

(>$) :: b -> ReaderT r m b -> ReaderT r m a #

Alternative m => Alternative (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

empty :: ReaderT r m a #

(<|>) :: ReaderT r m a -> ReaderT r m a -> ReaderT r m a #

some :: ReaderT r m a -> ReaderT r m [a] #

many :: ReaderT r m a -> ReaderT r m [a] #

Applicative m => Applicative (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

pure :: a -> ReaderT r m a #

(<*>) :: ReaderT r m (a -> b) -> ReaderT r m a -> ReaderT r m b #

liftA2 :: (a -> b -> c) -> ReaderT r m a -> ReaderT r m b -> ReaderT r m c #

(*>) :: ReaderT r m a -> ReaderT r m b -> ReaderT r m b #

(<*) :: ReaderT r m a -> ReaderT r m b -> ReaderT r m a #

Functor m => Functor (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

fmap :: (a -> b) -> ReaderT r m a -> ReaderT r m b #

(<$) :: a -> ReaderT r m b -> ReaderT r m a #

Monad m => Monad (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

(>>=) :: ReaderT r m a -> (a -> ReaderT r m b) -> ReaderT r m b #

(>>) :: ReaderT r m a -> ReaderT r m b -> ReaderT r m b #

return :: a -> ReaderT r m a #

MonadPlus m => MonadPlus (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

mzero :: ReaderT r m a #

mplus :: ReaderT r m a -> ReaderT r m a -> ReaderT r m a #

MonadCatch m => MonadCatch (ReaderT r m) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => ReaderT r m a -> (e -> ReaderT r m a) -> ReaderT r m a #

MonadMask m => MonadMask (ReaderT r m) 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. ReaderT r m a -> ReaderT r m a) -> ReaderT r m b) -> ReaderT r m b #

uninterruptibleMask :: ((forall a. ReaderT r m a -> ReaderT r m a) -> ReaderT r m b) -> ReaderT r m b #

generalBracket :: ReaderT r m a -> (a -> ExitCase b -> ReaderT r m c) -> (a -> ReaderT r m b) -> ReaderT r m (b, c) #

MonadThrow m => MonadThrow (ReaderT r m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> ReaderT r m a #

MonadLogger m => MonadLogger (ReaderT r m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> ReaderT r m () #

MonadLoggerIO m => MonadLoggerIO (ReaderT r m) 
Instance details

Defined in Control.Monad.Logger

Methods

askLoggerIO :: ReaderT r m (Loc -> LogSource -> LogLevel -> LogStr -> IO ()) #

PrimMonad m => PrimMonad (ReaderT r m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (ReaderT r m) #

Methods

primitive :: (State# (PrimState (ReaderT r m)) -> (# State# (PrimState (ReaderT r m)), a #)) -> ReaderT r m a #

MonadResource m => MonadResource (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

liftResourceT :: ResourceT IO a -> ReaderT r m a #

MonadUnliftIO m => MonadUnliftIO (ReaderT r m) 
Instance details

Defined in Control.Monad.IO.Unlift

Methods

withRunInIO :: ((forall a. ReaderT r m a -> IO a) -> IO b) -> ReaderT r m b #

Monad m => Magnify (ReaderT b m) (ReaderT a m) b a 
Instance details

Defined in Control.Lens.Zoom

Methods

magnify :: ((Functor (Magnified (ReaderT b m) c), Contravariant (Magnified (ReaderT b m) c)) => LensLike' (Magnified (ReaderT b m) c) a b) -> ReaderT b m c -> ReaderT a m c #

Zoom m n s t => Zoom (ReaderT e m) (ReaderT e n) s t 
Instance details

Defined in Control.Lens.Zoom

Methods

zoom :: LensLike' (Zoomed (ReaderT e m) c) t s -> ReaderT e m c -> ReaderT e n c #

Monad m => Magnify (ReaderT b m) (ReaderT a m) b a 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

magnify :: LensLike' (Magnified (ReaderT b m) c) a b -> ReaderT b m c -> ReaderT a m c #

Zoom m n s t => Zoom (ReaderT e m) (ReaderT e n) s t 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

zoom :: LensLike' (Zoomed (ReaderT e m) c) t s -> ReaderT e m c -> ReaderT e n c #

Wrapped (ReaderT r m a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (ReaderT r m a) #

Methods

_Wrapped' :: Iso' (ReaderT r m a) (Unwrapped (ReaderT r m a)) #

Functor m => MonoFunctor (ReaderT r m a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (ReaderT r m a) -> Element (ReaderT r m a)) -> ReaderT r m a -> ReaderT r m a #

Applicative m => MonoPointed (ReaderT r m a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (ReaderT r m a) -> ReaderT r m a #

t ~ ReaderT s n b => Rewrapped (ReaderT r m a) t 
Instance details

Defined in Control.Lens.Wrapped

type Rep1 (ReaderT r m :: Type -> TYPE LiftedRep) 
Instance details

Defined in Control.Monad.Trans.Instances

type Rep1 (ReaderT r m :: Type -> TYPE LiftedRep) = D1 ('MetaData "ReaderT" "Control.Monad.Trans.Reader" "transformers-0.5.6.2" 'True) (C1 ('MetaCons "ReaderT" 'PrefixI 'True) (S1 ('MetaSel ('Just "runReaderT") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) ((FUN 'Many r :: TYPE LiftedRep -> Type) :.: Rec1 m)))
type StT (ReaderT r) a 
Instance details

Defined in Control.Monad.Trans.Control

type StT (ReaderT r) a = a
type Rep (ReaderT e m) 
Instance details

Defined in Data.Functor.Rep

type Rep (ReaderT e m) = (e, Rep m)
type Magnified (ReaderT b m) 
Instance details

Defined in Control.Lens.Zoom

type Magnified (ReaderT b m) = Effect m
type Zoomed (ReaderT e m) 
Instance details

Defined in Control.Lens.Zoom

type Zoomed (ReaderT e m) = Zoomed m
type Magnified (ReaderT b m) 
Instance details

Defined in Lens.Micro.Mtl.Internal

type Magnified (ReaderT b m) = Effect m
type Zoomed (ReaderT e m) 
Instance details

Defined in Lens.Micro.Mtl.Internal

type Zoomed (ReaderT e m) = Zoomed m
type PrimState (ReaderT r m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ReaderT r m) = PrimState m
type StM (ReaderT r m) a 
Instance details

Defined in Control.Monad.Trans.Control

type StM (ReaderT r m) a = ComposeSt (ReaderT r) m a
type Rep (ReaderT r m a) 
Instance details

Defined in Control.Monad.Trans.Instances

type Rep (ReaderT r m a) = D1 ('MetaData "ReaderT" "Control.Monad.Trans.Reader" "transformers-0.5.6.2" 'True) (C1 ('MetaCons "ReaderT" 'PrefixI 'True) (S1 ('MetaSel ('Just "runReaderT") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (r -> m a))))
type Unwrapped (ReaderT r m a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (ReaderT r m a) = r -> m a
type Element (ReaderT r m a) 
Instance details

Defined in Data.MonoTraversable

type Element (ReaderT r m a) = a

data IntMap a #

A map of integers to values a.

Instances

Instances details
Arbitrary1 IntMap 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitrary :: Gen a -> Gen (IntMap a) #

liftShrink :: (a -> [a]) -> IntMap a -> [IntMap a] #

FromJSON1 IntMap 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (IntMap a) #

liftParseJSONList :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [IntMap a] #

ToJSON1 IntMap 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Value) -> ([a] -> Value) -> IntMap a -> Value #

liftToJSONList :: (a -> Value) -> ([a] -> Value) -> [IntMap a] -> Value #

liftToEncoding :: (a -> Encoding) -> ([a] -> Encoding) -> IntMap a -> Encoding #

liftToEncodingList :: (a -> Encoding) -> ([a] -> Encoding) -> [IntMap a] -> Encoding #

Foldable IntMap

Folds in order of increasing key.

Instance details

Defined in Data.IntMap.Internal

Methods

fold :: Monoid m => IntMap m -> m #

foldMap :: Monoid m => (a -> m) -> IntMap a -> m #

foldMap' :: Monoid m => (a -> m) -> IntMap a -> m #

foldr :: (a -> b -> b) -> b -> IntMap a -> b #

foldr' :: (a -> b -> b) -> b -> IntMap a -> b #

foldl :: (b -> a -> b) -> b -> IntMap a -> b #

foldl' :: (b -> a -> b) -> b -> IntMap a -> b #

foldr1 :: (a -> a -> a) -> IntMap a -> a #

foldl1 :: (a -> a -> a) -> IntMap a -> a #

toList :: IntMap a -> [a] #

null :: IntMap a -> Bool #

length :: IntMap a -> Int #

elem :: Eq a => a -> IntMap a -> Bool #

maximum :: Ord a => IntMap a -> a #

minimum :: Ord a => IntMap a -> a #

sum :: Num a => IntMap a -> a #

product :: Num a => IntMap a -> a #

Eq1 IntMap

Since: containers-0.5.9

Instance details

Defined in Data.IntMap.Internal

Methods

liftEq :: (a -> b -> Bool) -> IntMap a -> IntMap b -> Bool #

Ord1 IntMap

Since: containers-0.5.9

Instance details

Defined in Data.IntMap.Internal

Methods

liftCompare :: (a -> b -> Ordering) -> IntMap a -> IntMap b -> Ordering #

Read1 IntMap

Since: containers-0.5.9

Instance details

Defined in Data.IntMap.Internal

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (IntMap a) #

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [IntMap a] #

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (IntMap a) #

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [IntMap a] #

Show1 IntMap

Since: containers-0.5.9

Instance details

Defined in Data.IntMap.Internal

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> IntMap a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [IntMap a] -> ShowS #

Traversable IntMap

Traverses in order of increasing key.

Instance details

Defined in Data.IntMap.Internal

Methods

traverse :: Applicative f => (a -> f b) -> IntMap a -> f (IntMap b) #

sequenceA :: Applicative f => IntMap (f a) -> f (IntMap a) #

mapM :: Monad m => (a -> m b) -> IntMap a -> m (IntMap b) #

sequence :: Monad m => IntMap (m a) -> m (IntMap a) #

Functor IntMap 
Instance details

Defined in Data.IntMap.Internal

Methods

fmap :: (a -> b) -> IntMap a -> IntMap b #

(<$) :: a -> IntMap b -> IntMap a #

Hashable1 IntMap

Since: hashable-1.3.4.0

Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> IntMap a -> Int #

Arbitrary a => Arbitrary (IntMap a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (IntMap a) #

shrink :: IntMap a -> [IntMap a] #

CoArbitrary a => CoArbitrary (IntMap a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: IntMap a -> Gen b -> Gen b #

Function a => Function (IntMap a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (IntMap a -> b) -> IntMap a :-> b #

FromJSON a => FromJSON (IntMap a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON a => ToJSON (IntMap a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Data a => Data (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IntMap a -> c (IntMap a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (IntMap a) #

toConstr :: IntMap a -> Constr #

dataTypeOf :: IntMap a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (IntMap a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (IntMap a)) #

gmapT :: (forall b. Data b => b -> b) -> IntMap a -> IntMap a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IntMap a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IntMap a -> r #

gmapQ :: (forall d. Data d => d -> u) -> IntMap a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IntMap a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IntMap a -> m (IntMap a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IntMap a -> m (IntMap a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IntMap a -> m (IntMap a) #

Monoid (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

mempty :: IntMap a #

mappend :: IntMap a -> IntMap a -> IntMap a #

mconcat :: [IntMap a] -> IntMap a #

Semigroup (IntMap a)

Since: containers-0.5.7

Instance details

Defined in Data.IntMap.Internal

Methods

(<>) :: IntMap a -> IntMap a -> IntMap a #

sconcat :: NonEmpty (IntMap a) -> IntMap a #

stimes :: Integral b => b -> IntMap a -> IntMap a #

IsList (IntMap a)

Since: containers-0.5.6.2

Instance details

Defined in Data.IntMap.Internal

Associated Types

type Item (IntMap a) #

Methods

fromList :: [Item (IntMap a)] -> IntMap a #

fromListN :: Int -> [Item (IntMap a)] -> IntMap a #

toList :: IntMap a -> [Item (IntMap a)] #

Read e => Read (IntMap e) 
Instance details

Defined in Data.IntMap.Internal

Show a => Show (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

showsPrec :: Int -> IntMap a -> ShowS #

show :: IntMap a -> String #

showList :: [IntMap a] -> ShowS #

NFData a => NFData (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

rnf :: IntMap a -> () #

Eq a => Eq (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

(==) :: IntMap a -> IntMap a -> Bool #

(/=) :: IntMap a -> IntMap a -> Bool #

Ord a => Ord (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

compare :: IntMap a -> IntMap a -> Ordering #

(<) :: IntMap a -> IntMap a -> Bool #

(<=) :: IntMap a -> IntMap a -> Bool #

(>) :: IntMap a -> IntMap a -> Bool #

(>=) :: IntMap a -> IntMap a -> Bool #

max :: IntMap a -> IntMap a -> IntMap a #

min :: IntMap a -> IntMap a -> IntMap a #

Hashable v => Hashable (IntMap v)

Since: hashable-1.3.4.0

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> IntMap v -> Int #

hash :: IntMap v -> Int #

At (IntMap a) 
Instance details

Defined in Control.Lens.At

Methods

at :: Index (IntMap a) -> Lens' (IntMap a) (Maybe (IxValue (IntMap a))) #

Ixed (IntMap a) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (IntMap a) -> Traversal' (IntMap a) (IxValue (IntMap a)) #

Wrapped (IntMap a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (IntMap a) #

Methods

_Wrapped' :: Iso' (IntMap a) (Unwrapped (IntMap a)) #

GrowingAppend (IntMap v) 
Instance details

Defined in Data.MonoTraversable

MonoFoldable (IntMap a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (IntMap a) -> m) -> IntMap a -> m #

ofoldr :: (Element (IntMap a) -> b -> b) -> b -> IntMap a -> b #

ofoldl' :: (a0 -> Element (IntMap a) -> a0) -> a0 -> IntMap a -> a0 #

otoList :: IntMap a -> [Element (IntMap a)] #

oall :: (Element (IntMap a) -> Bool) -> IntMap a -> Bool #

oany :: (Element (IntMap a) -> Bool) -> IntMap a -> Bool #

onull :: IntMap a -> Bool #

olength :: IntMap a -> Int #

olength64 :: IntMap a -> Int64 #

ocompareLength :: Integral i => IntMap a -> i -> Ordering #

otraverse_ :: Applicative f => (Element (IntMap a) -> f b) -> IntMap a -> f () #

ofor_ :: Applicative f => IntMap a -> (Element (IntMap a) -> f b) -> f () #

omapM_ :: Applicative m => (Element (IntMap a) -> m ()) -> IntMap a -> m () #

oforM_ :: Applicative m => IntMap a -> (Element (IntMap a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (IntMap a) -> m a0) -> a0 -> IntMap a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (IntMap a) -> m) -> IntMap a -> m #

ofoldr1Ex :: (Element (IntMap a) -> Element (IntMap a) -> Element (IntMap a)) -> IntMap a -> Element (IntMap a) #

ofoldl1Ex' :: (Element (IntMap a) -> Element (IntMap a) -> Element (IntMap a)) -> IntMap a -> Element (IntMap a) #

headEx :: IntMap a -> Element (IntMap a) #

lastEx :: IntMap a -> Element (IntMap a) #

unsafeHead :: IntMap a -> Element (IntMap a) #

unsafeLast :: IntMap a -> Element (IntMap a) #

maximumByEx :: (Element (IntMap a) -> Element (IntMap a) -> Ordering) -> IntMap a -> Element (IntMap a) #

minimumByEx :: (Element (IntMap a) -> Element (IntMap a) -> Ordering) -> IntMap a -> Element (IntMap a) #

oelem :: Element (IntMap a) -> IntMap a -> Bool #

onotElem :: Element (IntMap a) -> IntMap a -> Bool #

MonoFunctor (IntMap a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (IntMap a) -> Element (IntMap a)) -> IntMap a -> IntMap a #

MonoTraversable (IntMap a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (IntMap a) -> f (Element (IntMap a))) -> IntMap a -> f (IntMap a) #

omapM :: Applicative m => (Element (IntMap a) -> m (Element (IntMap a))) -> IntMap a -> m (IntMap a) #

t ~ IntMap a' => Rewrapped (IntMap a) t

Use _Wrapping fromList. unwrapping returns a sorted list.

Instance details

Defined in Control.Lens.Wrapped

type Item (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

type Item (IntMap a) = (Key, a)
type Index (IntMap a) 
Instance details

Defined in Control.Lens.At

type Index (IntMap a) = Int
type IxValue (IntMap a) 
Instance details

Defined in Control.Lens.At

type IxValue (IntMap a) = a
type Unwrapped (IntMap a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (IntMap a) = [(Int, a)]
type Element (IntMap a) 
Instance details

Defined in Data.MonoTraversable

type Element (IntMap a) = a

data IntSet #

A set of integers.

Instances

Instances details
Arbitrary IntSet 
Instance details

Defined in Test.QuickCheck.Arbitrary

CoArbitrary IntSet 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: IntSet -> Gen b -> Gen b #

Function IntSet 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (IntSet -> b) -> IntSet :-> b #

FromJSON IntSet 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON IntSet 
Instance details

Defined in Data.Aeson.Types.ToJSON

Data IntSet 
Instance details

Defined in Data.IntSet.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IntSet -> c IntSet #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IntSet #

toConstr :: IntSet -> Constr #

dataTypeOf :: IntSet -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IntSet) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IntSet) #

gmapT :: (forall b. Data b => b -> b) -> IntSet -> IntSet #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IntSet -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IntSet -> r #

gmapQ :: (forall d. Data d => d -> u) -> IntSet -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IntSet -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IntSet -> m IntSet #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IntSet -> m IntSet #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IntSet -> m IntSet #

Monoid IntSet 
Instance details

Defined in Data.IntSet.Internal

Semigroup IntSet

Since: containers-0.5.7

Instance details

Defined in Data.IntSet.Internal

IsList IntSet

Since: containers-0.5.6.2

Instance details

Defined in Data.IntSet.Internal

Associated Types

type Item IntSet #

Read IntSet 
Instance details

Defined in Data.IntSet.Internal

Show IntSet 
Instance details

Defined in Data.IntSet.Internal

NFData IntSet 
Instance details

Defined in Data.IntSet.Internal

Methods

rnf :: IntSet -> () #

Eq IntSet 
Instance details

Defined in Data.IntSet.Internal

Methods

(==) :: IntSet -> IntSet -> Bool #

(/=) :: IntSet -> IntSet -> Bool #

Ord IntSet 
Instance details

Defined in Data.IntSet.Internal

Hashable IntSet

Since: hashable-1.3.4.0

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> IntSet -> Int #

hash :: IntSet -> Int #

At IntSet 
Instance details

Defined in Control.Lens.At

Contains IntSet 
Instance details

Defined in Control.Lens.At

Ixed IntSet 
Instance details

Defined in Control.Lens.At

Wrapped IntSet 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped IntSet #

GrowingAppend IntSet 
Instance details

Defined in Data.MonoTraversable

MonoFoldable IntSet 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element IntSet -> m) -> IntSet -> m #

ofoldr :: (Element IntSet -> b -> b) -> b -> IntSet -> b #

ofoldl' :: (a -> Element IntSet -> a) -> a -> IntSet -> a #

otoList :: IntSet -> [Element IntSet] #

oall :: (Element IntSet -> Bool) -> IntSet -> Bool #

oany :: (Element IntSet -> Bool) -> IntSet -> Bool #

onull :: IntSet -> Bool #

olength :: IntSet -> Int #

olength64 :: IntSet -> Int64 #

ocompareLength :: Integral i => IntSet -> i -> Ordering #

otraverse_ :: Applicative f => (Element IntSet -> f b) -> IntSet -> f () #

ofor_ :: Applicative f => IntSet -> (Element IntSet -> f b) -> f () #

omapM_ :: Applicative m => (Element IntSet -> m ()) -> IntSet -> m () #

oforM_ :: Applicative m => IntSet -> (Element IntSet -> m ()) -> m () #

ofoldlM :: Monad m => (a -> Element IntSet -> m a) -> a -> IntSet -> m a #

ofoldMap1Ex :: Semigroup m => (Element IntSet -> m) -> IntSet -> m #

ofoldr1Ex :: (Element IntSet -> Element IntSet -> Element IntSet) -> IntSet -> Element IntSet #

ofoldl1Ex' :: (Element IntSet -> Element IntSet -> Element IntSet) -> IntSet -> Element IntSet #

headEx :: IntSet -> Element IntSet #

lastEx :: IntSet -> Element IntSet #

unsafeHead :: IntSet -> Element IntSet #

unsafeLast :: IntSet -> Element IntSet #

maximumByEx :: (Element IntSet -> Element IntSet -> Ordering) -> IntSet -> Element IntSet #

minimumByEx :: (Element IntSet -> Element IntSet -> Ordering) -> IntSet -> Element IntSet #

oelem :: Element IntSet -> IntSet -> Bool #

onotElem :: Element IntSet -> IntSet -> Bool #

MonoPointed IntSet 
Instance details

Defined in Data.MonoTraversable

t ~ IntSet => Rewrapped IntSet t

Use _Wrapping fromList. unwrapping returns a sorted list.

Instance details

Defined in Control.Lens.Wrapped

type Item IntSet 
Instance details

Defined in Data.IntSet.Internal

type Item IntSet = Key
type Index IntSet 
Instance details

Defined in Control.Lens.At

type IxValue IntSet 
Instance details

Defined in Control.Lens.At

type IxValue IntSet = ()
type Unwrapped IntSet 
Instance details

Defined in Control.Lens.Wrapped

type Element IntSet 
Instance details

Defined in Data.MonoTraversable

data Seq a #

General-purpose finite sequences.

Instances

Instances details
Arbitrary1 Seq 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitrary :: Gen a -> Gen (Seq a) #

liftShrink :: (a -> [a]) -> Seq a -> [Seq a] #

FromJSON1 Seq 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (Seq a) #

liftParseJSONList :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [Seq a] #

ToJSON1 Seq 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Value) -> ([a] -> Value) -> Seq a -> Value #

liftToJSONList :: (a -> Value) -> ([a] -> Value) -> [Seq a] -> Value #

liftToEncoding :: (a -> Encoding) -> ([a] -> Encoding) -> Seq a -> Encoding #

liftToEncodingList :: (a -> Encoding) -> ([a] -> Encoding) -> [Seq a] -> Encoding #

MonadFix Seq

Since: containers-0.5.11

Instance details

Defined in Data.Sequence.Internal

Methods

mfix :: (a -> Seq a) -> Seq a #

MonadZip Seq
 mzipWith = zipWith
 munzip = unzip
Instance details

Defined in Data.Sequence.Internal

Methods

mzip :: Seq a -> Seq b -> Seq (a, b) #

mzipWith :: (a -> b -> c) -> Seq a -> Seq b -> Seq c #

munzip :: Seq (a, b) -> (Seq a, Seq b) #

Foldable Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

fold :: Monoid m => Seq m -> m #

foldMap :: Monoid m => (a -> m) -> Seq a -> m #

foldMap' :: Monoid m => (a -> m) -> Seq a -> m #

foldr :: (a -> b -> b) -> b -> Seq a -> b #

foldr' :: (a -> b -> b) -> b -> Seq a -> b #

foldl :: (b -> a -> b) -> b -> Seq a -> b #

foldl' :: (b -> a -> b) -> b -> Seq a -> b #

foldr1 :: (a -> a -> a) -> Seq a -> a #

foldl1 :: (a -> a -> a) -> Seq a -> a #

toList :: Seq a -> [a] #

null :: Seq a -> Bool #

length :: Seq a -> Int #

elem :: Eq a => a -> Seq a -> Bool #

maximum :: Ord a => Seq a -> a #

minimum :: Ord a => Seq a -> a #

sum :: Num a => Seq a -> a #

product :: Num a => Seq a -> a #

Eq1 Seq

Since: containers-0.5.9

Instance details

Defined in Data.Sequence.Internal

Methods

liftEq :: (a -> b -> Bool) -> Seq a -> Seq b -> Bool #

Ord1 Seq

Since: containers-0.5.9

Instance details

Defined in Data.Sequence.Internal

Methods

liftCompare :: (a -> b -> Ordering) -> Seq a -> Seq b -> Ordering #

Read1 Seq

Since: containers-0.5.9

Instance details

Defined in Data.Sequence.Internal

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (Seq a) #

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [Seq a] #

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (Seq a) #

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [Seq a] #

Show1 Seq

Since: containers-0.5.9

Instance details

Defined in Data.Sequence.Internal

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Seq a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Seq a] -> ShowS #

Traversable Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

traverse :: Applicative f => (a -> f b) -> Seq a -> f (Seq b) #

sequenceA :: Applicative f => Seq (f a) -> f (Seq a) #

mapM :: Monad m => (a -> m b) -> Seq a -> m (Seq b) #

sequence :: Monad m => Seq (m a) -> m (Seq a) #

Alternative Seq

Since: containers-0.5.4

Instance details

Defined in Data.Sequence.Internal

Methods

empty :: Seq a #

(<|>) :: Seq a -> Seq a -> Seq a #

some :: Seq a -> Seq [a] #

many :: Seq a -> Seq [a] #

Applicative Seq

Since: containers-0.5.4

Instance details

Defined in Data.Sequence.Internal

Methods

pure :: a -> Seq a #

(<*>) :: Seq (a -> b) -> Seq a -> Seq b #

liftA2 :: (a -> b -> c) -> Seq a -> Seq b -> Seq c #

(*>) :: Seq a -> Seq b -> Seq b #

(<*) :: Seq a -> Seq b -> Seq a #

Functor Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

fmap :: (a -> b) -> Seq a -> Seq b #

(<$) :: a -> Seq b -> Seq a #

Monad Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

(>>=) :: Seq a -> (a -> Seq b) -> Seq b #

(>>) :: Seq a -> Seq b -> Seq b #

return :: a -> Seq a #

MonadPlus Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

mzero :: Seq a #

mplus :: Seq a -> Seq a -> Seq a #

UnzipWith Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

unzipWith' :: (x -> (a, b)) -> Seq x -> (Seq a, Seq b)

Hashable1 Seq

Since: hashable-1.3.4.0

Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> Seq a -> Int #

Arbitrary a => Arbitrary (Seq a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (Seq a) #

shrink :: Seq a -> [Seq a] #

CoArbitrary a => CoArbitrary (Seq a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Seq a -> Gen b -> Gen b #

Function a => Function (Seq a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Seq a -> b) -> Seq a :-> b #

FromJSON a => FromJSON (Seq a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Seq a) #

parseJSONList :: Value -> Parser [Seq a] #

ToJSON a => ToJSON (Seq a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Seq a -> Value #

toEncoding :: Seq a -> Encoding #

toJSONList :: [Seq a] -> Value #

toEncodingList :: [Seq a] -> Encoding #

Data a => Data (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Seq a -> c (Seq a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Seq a) #

toConstr :: Seq a -> Constr #

dataTypeOf :: Seq a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Seq a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Seq a)) #

gmapT :: (forall b. Data b => b -> b) -> Seq a -> Seq a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Seq a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Seq a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Seq a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Seq a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Seq a -> m (Seq a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Seq a -> m (Seq a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Seq a -> m (Seq a) #

a ~ Char => IsString (Seq a)

Since: containers-0.5.7

Instance details

Defined in Data.Sequence.Internal

Methods

fromString :: String -> Seq a #

Monoid (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

mempty :: Seq a #

mappend :: Seq a -> Seq a -> Seq a #

mconcat :: [Seq a] -> Seq a #

Semigroup (Seq a)

Since: containers-0.5.7

Instance details

Defined in Data.Sequence.Internal

Methods

(<>) :: Seq a -> Seq a -> Seq a #

sconcat :: NonEmpty (Seq a) -> Seq a #

stimes :: Integral b => b -> Seq a -> Seq a #

IsList (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Associated Types

type Item (Seq a) #

Methods

fromList :: [Item (Seq a)] -> Seq a #

fromListN :: Int -> [Item (Seq a)] -> Seq a #

toList :: Seq a -> [Item (Seq a)] #

Read a => Read (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Show a => Show (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

showsPrec :: Int -> Seq a -> ShowS #

show :: Seq a -> String #

showList :: [Seq a] -> ShowS #

NFData a => NFData (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

rnf :: Seq a -> () #

Eq a => Eq (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

(==) :: Seq a -> Seq a -> Bool #

(/=) :: Seq a -> Seq a -> Bool #

Ord a => Ord (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

compare :: Seq a -> Seq a -> Ordering #

(<) :: Seq a -> Seq a -> Bool #

(<=) :: Seq a -> Seq a -> Bool #

(>) :: Seq a -> Seq a -> Bool #

(>=) :: Seq a -> Seq a -> Bool #

max :: Seq a -> Seq a -> Seq a #

min :: Seq a -> Seq a -> Seq a #

Hashable v => Hashable (Seq v)

Since: hashable-1.3.4.0

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Seq v -> Int #

hash :: Seq v -> Int #

Ixed (Seq a) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (Seq a) -> Traversal' (Seq a) (IxValue (Seq a)) #

Wrapped (Seq a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Seq a) #

Methods

_Wrapped' :: Iso' (Seq a) (Unwrapped (Seq a)) #

GrowingAppend (Seq a) 
Instance details

Defined in Data.MonoTraversable

MonoFoldable (Seq a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (Seq a) -> m) -> Seq a -> m #

ofoldr :: (Element (Seq a) -> b -> b) -> b -> Seq a -> b #

ofoldl' :: (a0 -> Element (Seq a) -> a0) -> a0 -> Seq a -> a0 #

otoList :: Seq a -> [Element (Seq a)] #

oall :: (Element (Seq a) -> Bool) -> Seq a -> Bool #

oany :: (Element (Seq a) -> Bool) -> Seq a -> Bool #

onull :: Seq a -> Bool #

olength :: Seq a -> Int #

olength64 :: Seq a -> Int64 #

ocompareLength :: Integral i => Seq a -> i -> Ordering #

otraverse_ :: Applicative f => (Element (Seq a) -> f b) -> Seq a -> f () #

ofor_ :: Applicative f => Seq a -> (Element (Seq a) -> f b) -> f () #

omapM_ :: Applicative m => (Element (Seq a) -> m ()) -> Seq a -> m () #

oforM_ :: Applicative m => Seq a -> (Element (Seq a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (Seq a) -> m a0) -> a0 -> Seq a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (Seq a) -> m) -> Seq a -> m #

ofoldr1Ex :: (Element (Seq a) -> Element (Seq a) -> Element (Seq a)) -> Seq a -> Element (Seq a) #

ofoldl1Ex' :: (Element (Seq a) -> Element (Seq a) -> Element (Seq a)) -> Seq a -> Element (Seq a) #

headEx :: Seq a -> Element (Seq a) #

lastEx :: Seq a -> Element (Seq a) #

unsafeHead :: Seq a -> Element (Seq a) #

unsafeLast :: Seq a -> Element (Seq a) #

maximumByEx :: (Element (Seq a) -> Element (Seq a) -> Ordering) -> Seq a -> Element (Seq a) #

minimumByEx :: (Element (Seq a) -> Element (Seq a) -> Ordering) -> Seq a -> Element (Seq a) #

oelem :: Element (Seq a) -> Seq a -> Bool #

onotElem :: Element (Seq a) -> Seq a -> Bool #

MonoFunctor (Seq a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Seq a) -> Element (Seq a)) -> Seq a -> Seq a #

MonoPointed (Seq a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Seq a) -> Seq a #

MonoTraversable (Seq a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (Seq a) -> f (Element (Seq a))) -> Seq a -> f (Seq a) #

omapM :: Applicative m => (Element (Seq a) -> m (Element (Seq a))) -> Seq a -> m (Seq a) #

IsSequence (Seq a) 
Instance details

Defined in Data.Sequences

Methods

fromList :: [Element (Seq a)] -> Seq a #

lengthIndex :: Seq a -> Index (Seq a) #

break :: (Element (Seq a) -> Bool) -> Seq a -> (Seq a, Seq a) #

span :: (Element (Seq a) -> Bool) -> Seq a -> (Seq a, Seq a) #

dropWhile :: (Element (Seq a) -> Bool) -> Seq a -> Seq a #

takeWhile :: (Element (Seq a) -> Bool) -> Seq a -> Seq a #

splitAt :: Index (Seq a) -> Seq a -> (Seq a, Seq a) #

unsafeSplitAt :: Index (Seq a) -> Seq a -> (Seq a, Seq a) #

take :: Index (Seq a) -> Seq a -> Seq a #

unsafeTake :: Index (Seq a) -> Seq a -> Seq a #

drop :: Index (Seq a) -> Seq a -> Seq a #

unsafeDrop :: Index (Seq a) -> Seq a -> Seq a #

dropEnd :: Index (Seq a) -> Seq a -> Seq a #

partition :: (Element (Seq a) -> Bool) -> Seq a -> (Seq a, Seq a) #

uncons :: Seq a -> Maybe (Element (Seq a), Seq a) #

unsnoc :: Seq a -> Maybe (Seq a, Element (Seq a)) #

filter :: (Element (Seq a) -> Bool) -> Seq a -> Seq a #

filterM :: Monad m => (Element (Seq a) -> m Bool) -> Seq a -> m (Seq a) #

replicate :: Index (Seq a) -> Element (Seq a) -> Seq a #

replicateM :: Monad m => Index (Seq a) -> m (Element (Seq a)) -> m (Seq a) #

groupBy :: (Element (Seq a) -> Element (Seq a) -> Bool) -> Seq a -> [Seq a] #

groupAllOn :: Eq b => (Element (Seq a) -> b) -> Seq a -> [Seq a] #

subsequences :: Seq a -> [Seq a] #

permutations :: Seq a -> [Seq a] #

tailEx :: Seq a -> Seq a #

tailMay :: Seq a -> Maybe (Seq a) #

initEx :: Seq a -> Seq a #

initMay :: Seq a -> Maybe (Seq a) #

unsafeTail :: Seq a -> Seq a #

unsafeInit :: Seq a -> Seq a #

index :: Seq a -> Index (Seq a) -> Maybe (Element (Seq a)) #

indexEx :: Seq a -> Index (Seq a) -> Element (Seq a) #

unsafeIndex :: Seq a -> Index (Seq a) -> Element (Seq a) #

splitWhen :: (Element (Seq a) -> Bool) -> Seq a -> [Seq a] #

SemiSequence (Seq a) 
Instance details

Defined in Data.Sequences

Associated Types

type Index (Seq a) #

Methods

intersperse :: Element (Seq a) -> Seq a -> Seq a #

reverse :: Seq a -> Seq a #

find :: (Element (Seq a) -> Bool) -> Seq a -> Maybe (Element (Seq a)) #

sortBy :: (Element (Seq a) -> Element (Seq a) -> Ordering) -> Seq a -> Seq a #

cons :: Element (Seq a) -> Seq a -> Seq a #

snoc :: Seq a -> Element (Seq a) -> Seq a #

t ~ Seq a' => Rewrapped (Seq a) t 
Instance details

Defined in Control.Lens.Wrapped

type Item (Seq a) 
Instance details

Defined in Data.Sequence.Internal

type Item (Seq a) = a
type Index (Seq a) 
Instance details

Defined in Control.Lens.At

type Index (Seq a) = Int
type IxValue (Seq a) 
Instance details

Defined in Control.Lens.At

type IxValue (Seq a) = a
type Unwrapped (Seq a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (Seq a) = [a]
type Element (Seq a) 
Instance details

Defined in Data.MonoTraversable

type Element (Seq a) = a
type Index (Seq a) 
Instance details

Defined in Data.Sequences

type Index (Seq a) = Int

data Set a #

A set of values a.

Instances

Instances details
ToJSON1 Set 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Value) -> ([a] -> Value) -> Set a -> Value #

liftToJSONList :: (a -> Value) -> ([a] -> Value) -> [Set a] -> Value #

liftToEncoding :: (a -> Encoding) -> ([a] -> Encoding) -> Set a -> Encoding #

liftToEncodingList :: (a -> Encoding) -> ([a] -> Encoding) -> [Set a] -> Encoding #

Foldable Set

Folds in order of increasing key.

Instance details

Defined in Data.Set.Internal

Methods

fold :: Monoid m => Set m -> m #

foldMap :: Monoid m => (a -> m) -> Set a -> m #

foldMap' :: Monoid m => (a -> m) -> Set a -> m #

foldr :: (a -> b -> b) -> b -> Set a -> b #

foldr' :: (a -> b -> b) -> b -> Set a -> b #

foldl :: (b -> a -> b) -> b -> Set a -> b #

foldl' :: (b -> a -> b) -> b -> Set a -> b #

foldr1 :: (a -> a -> a) -> Set a -> a #

foldl1 :: (a -> a -> a) -> Set a -> a #

toList :: Set a -> [a] #

null :: Set a -> Bool #

length :: Set a -> Int #

elem :: Eq a => a -> Set a -> Bool #

maximum :: Ord a => Set a -> a #

minimum :: Ord a => Set a -> a #

sum :: Num a => Set a -> a #

product :: Num a => Set a -> a #

Eq1 Set

Since: containers-0.5.9

Instance details

Defined in Data.Set.Internal

Methods

liftEq :: (a -> b -> Bool) -> Set a -> Set b -> Bool #

Ord1 Set

Since: containers-0.5.9

Instance details

Defined in Data.Set.Internal

Methods

liftCompare :: (a -> b -> Ordering) -> Set a -> Set b -> Ordering #

Show1 Set

Since: containers-0.5.9

Instance details

Defined in Data.Set.Internal

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Set a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Set a] -> ShowS #

Hashable1 Set

Since: hashable-1.3.4.0

Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> Set a -> Int #

(Ord a, Arbitrary a) => Arbitrary (Set a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (Set a) #

shrink :: Set a -> [Set a] #

CoArbitrary a => CoArbitrary (Set a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Set a -> Gen b -> Gen b #

(Ord a, Function a) => Function (Set a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Set a -> b) -> Set a :-> b #

(Ord a, FromJSON a) => FromJSON (Set a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Set a) #

parseJSONList :: Value -> Parser [Set a] #

ToJSON a => ToJSON (Set a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Set a -> Value #

toEncoding :: Set a -> Encoding #

toJSONList :: [Set a] -> Value #

toEncodingList :: [Set a] -> Encoding #

(Data a, Ord a) => Data (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Set a -> c (Set a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Set a) #

toConstr :: Set a -> Constr #

dataTypeOf :: Set a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Set a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Set a)) #

gmapT :: (forall b. Data b => b -> b) -> Set a -> Set a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Set a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Set a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Set a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Set a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Set a -> m (Set a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Set a -> m (Set a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Set a -> m (Set a) #

Ord a => Monoid (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

mempty :: Set a #

mappend :: Set a -> Set a -> Set a #

mconcat :: [Set a] -> Set a #

Ord a => Semigroup (Set a)

Since: containers-0.5.7

Instance details

Defined in Data.Set.Internal

Methods

(<>) :: Set a -> Set a -> Set a #

sconcat :: NonEmpty (Set a) -> Set a #

stimes :: Integral b => b -> Set a -> Set a #

Ord a => IsList (Set a)

Since: containers-0.5.6.2

Instance details

Defined in Data.Set.Internal

Associated Types

type Item (Set a) #

Methods

fromList :: [Item (Set a)] -> Set a #

fromListN :: Int -> [Item (Set a)] -> Set a #

toList :: Set a -> [Item (Set a)] #

(Read a, Ord a) => Read (Set a) 
Instance details

Defined in Data.Set.Internal

Show a => Show (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

showsPrec :: Int -> Set a -> ShowS #

show :: Set a -> String #

showList :: [Set a] -> ShowS #

NFData a => NFData (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

rnf :: Set a -> () #

Eq a => Eq (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

(==) :: Set a -> Set a -> Bool #

(/=) :: Set a -> Set a -> Bool #

Ord a => Ord (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

compare :: Set a -> Set a -> Ordering #

(<) :: Set a -> Set a -> Bool #

(<=) :: Set a -> Set a -> Bool #

(>) :: Set a -> Set a -> Bool #

(>=) :: Set a -> Set a -> Bool #

max :: Set a -> Set a -> Set a #

min :: Set a -> Set a -> Set a #

Hashable v => Hashable (Set v)

Since: hashable-1.3.4.0

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Set v -> Int #

hash :: Set v -> Int #

Ord k => At (Set k) 
Instance details

Defined in Control.Lens.At

Methods

at :: Index (Set k) -> Lens' (Set k) (Maybe (IxValue (Set k))) #

Ord a => Contains (Set a) 
Instance details

Defined in Control.Lens.At

Methods

contains :: Index (Set a) -> Lens' (Set a) Bool #

Ord k => Ixed (Set k) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (Set k) -> Traversal' (Set k) (IxValue (Set k)) #

Ord a => Wrapped (Set a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Set a) #

Methods

_Wrapped' :: Iso' (Set a) (Unwrapped (Set a)) #

Ord v => GrowingAppend (Set v) 
Instance details

Defined in Data.MonoTraversable

Ord e => MonoFoldable (Set e) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (Set e) -> m) -> Set e -> m #

ofoldr :: (Element (Set e) -> b -> b) -> b -> Set e -> b #

ofoldl' :: (a -> Element (Set e) -> a) -> a -> Set e -> a #

otoList :: Set e -> [Element (Set e)] #

oall :: (Element (Set e) -> Bool) -> Set e -> Bool #

oany :: (Element (Set e) -> Bool) -> Set e -> Bool #

onull :: Set e -> Bool #

olength :: Set e -> Int #

olength64 :: Set e -> Int64 #

ocompareLength :: Integral i => Set e -> i -> Ordering #

otraverse_ :: Applicative f => (Element (Set e) -> f b) -> Set e -> f () #

ofor_ :: Applicative f => Set e -> (Element (Set e) -> f b) -> f () #

omapM_ :: Applicative m => (Element (Set e) -> m ()) -> Set e -> m () #

oforM_ :: Applicative m => Set e -> (Element (Set e) -> m ()) -> m () #

ofoldlM :: Monad m => (a -> Element (Set e) -> m a) -> a -> Set e -> m a #

ofoldMap1Ex :: Semigroup m => (Element (Set e) -> m) -> Set e -> m #

ofoldr1Ex :: (Element (Set e) -> Element (Set e) -> Element (Set e)) -> Set e -> Element (Set e) #

ofoldl1Ex' :: (Element (Set e) -> Element (Set e) -> Element (Set e)) -> Set e -> Element (Set e) #

headEx :: Set e -> Element (Set e) #

lastEx :: Set e -> Element (Set e) #

unsafeHead :: Set e -> Element (Set e) #

unsafeLast :: Set e -> Element (Set e) #

maximumByEx :: (Element (Set e) -> Element (Set e) -> Ordering) -> Set e -> Element (Set e) #

minimumByEx :: (Element (Set e) -> Element (Set e) -> Ordering) -> Set e -> Element (Set e) #

oelem :: Element (Set e) -> Set e -> Bool #

onotElem :: Element (Set e) -> Set e -> Bool #

MonoPointed (Set a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Set a) -> Set a #

(t ~ Set a', Ord a) => Rewrapped (Set a) t

Use _Wrapping fromList. unwrapping returns a sorted list.

Instance details

Defined in Control.Lens.Wrapped

type Item (Set a) 
Instance details

Defined in Data.Set.Internal

type Item (Set a) = a
type Index (Set a) 
Instance details

Defined in Control.Lens.At

type Index (Set a) = a
type IxValue (Set k) 
Instance details

Defined in Control.Lens.At

type IxValue (Set k) = ()
type Unwrapped (Set a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (Set a) = [a]
type Element (Set e) 
Instance details

Defined in Data.MonoTraversable

type Element (Set e) = e

force :: NFData a => a -> a #

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

deepseq :: NFData a => a -> b -> b #

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

($!!) :: NFData a => (a -> b) -> a -> b infixr 0 #

the deep analogue of $!. In the expression f $!! x, x is fully evaluated before the function f is applied to it.

Since: deepseq-1.2.0.0

(</>) :: FilePath -> FilePath -> FilePath infixr 5 #

Combine two paths with a path separator. If the second path starts with a path separator or a drive letter, then it returns the second. The intention is that readFile (dir </> file) will access the same file as setCurrentDirectory dir; readFile file.

Posix:   "/directory" </> "file.ext" == "/directory/file.ext"
Windows: "/directory" </> "file.ext" == "/directory\\file.ext"
         "directory" </> "/file.ext" == "/file.ext"
Valid x => (takeDirectory x </> takeFileName x) `equalFilePath` x

Combined:

Posix:   "/" </> "test" == "/test"
Posix:   "home" </> "bob" == "home/bob"
Posix:   "x:" </> "foo" == "x:/foo"
Windows: "C:\\foo" </> "bar" == "C:\\foo\\bar"
Windows: "home" </> "bob" == "home\\bob"

Not combined:

Posix:   "home" </> "/bob" == "/bob"
Windows: "home" </> "C:\\bob" == "C:\\bob"

Not combined (tricky):

On Windows, if a filepath starts with a single slash, it is relative to the root of the current drive. In [1], this is (confusingly) referred to as an absolute path. The current behavior of </> is to never combine these forms.

Windows: "home" </> "/bob" == "/bob"
Windows: "home" </> "\\bob" == "\\bob"
Windows: "C:\\home" </> "\\bob" == "\\bob"

On Windows, from [1]: "If a file name begins with only a disk designator but not the backslash after the colon, it is interpreted as a relative path to the current directory on the drive with the specified letter." The current behavior of </> is to never combine these forms.

Windows: "D:\\foo" </> "C:bar" == "C:bar"
Windows: "C:\\foo" </> "C:bar" == "C:bar"

note :: a -> Maybe b -> Either a b #

Tag the Nothing value of a Maybe

hush :: Either a b -> Maybe b #

Suppress the Left value of an Either

data Handler (m :: Type -> Type) a #

Generalized version of Handler

Constructors

Exception e => Handler (e -> m a) 

Instances

Instances details
Monad m => Functor (Handler m) 
Instance details

Defined in Control.Monad.Catch

Methods

fmap :: (a -> b) -> Handler m a -> Handler m b #

(<$) :: a -> Handler m b -> Handler m a #

takeDirectory :: FilePath -> FilePath #

Get the directory name, move up one level.

          takeDirectory "/directory/other.ext" == "/directory"
          takeDirectory x `isPrefixOf` x || takeDirectory x == "."
          takeDirectory "foo" == "."
          takeDirectory "/" == "/"
          takeDirectory "/foo" == "/"
          takeDirectory "/foo/bar/baz" == "/foo/bar"
          takeDirectory "/foo/bar/baz/" == "/foo/bar/baz"
          takeDirectory "foo/bar/baz" == "foo/bar"
Windows:  takeDirectory "foo\\bar" == "foo"
Windows:  takeDirectory "foo\\bar\\\\" == "foo\\bar"
Windows:  takeDirectory "C:\\" == "C:\\"

takeBaseName :: FilePath -> String #

Get the base name, without an extension or path.

takeBaseName "/directory/file.ext" == "file"
takeBaseName "file/test.txt" == "test"
takeBaseName "dave.ext" == "dave"
takeBaseName "" == ""
takeBaseName "test" == "test"
takeBaseName (addTrailingPathSeparator x) == ""
takeBaseName "file/file.tar.gz" == "file.tar"

dropExtension :: FilePath -> FilePath #

Remove last extension, and the "." preceding it.

dropExtension "/directory/path.ext" == "/directory/path"
dropExtension x == fst (splitExtension x)

(<.>) :: FilePath -> String -> FilePath infixr 7 #

Add an extension, even if there is already one there, equivalent to addExtension.

"/directory/path" <.> "ext" == "/directory/path.ext"
"/directory/path" <.> ".ext" == "/directory/path.ext"

class (Vector Vector a, MVector MVector a) => Unbox a #

Instances

Instances details
Unbox All 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox Any 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox Int16 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox Int64 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox Int8 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox Word16 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox Word32 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox Word64 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox Word8 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox () 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox Bool 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox Char 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox Double 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox Float 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox Int 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox Word 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox a => Unbox (Complex a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox a => Unbox (Identity a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox a => Unbox (Down a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox a => Unbox (First a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox a => Unbox (Last a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox a => Unbox (Max a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox a => Unbox (Min a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox a => Unbox (WrappedMonoid a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox a => Unbox (Dual a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox a => Unbox (Product a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox a => Unbox (Sum a) 
Instance details

Defined in Data.Vector.Unboxed.Base

(Unbox a, Unbox b) => Unbox (Arg a b) 
Instance details

Defined in Data.Vector.Unboxed.Base

(Unbox a, Unbox b) => Unbox (a, b) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox a => Unbox (Const a b) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox (f a) => Unbox (Alt f a) 
Instance details

Defined in Data.Vector.Unboxed.Base

(Unbox a, Unbox b, Unbox c) => Unbox (a, b, c) 
Instance details

Defined in Data.Vector.Unboxed.Base

(Unbox a, Unbox b, Unbox c, Unbox d) => Unbox (a, b, c, d) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox (f (g a)) => Unbox (Compose f g a) 
Instance details

Defined in Data.Vector.Unboxed.Base

(Unbox a, Unbox b, Unbox c, Unbox d, Unbox e) => Unbox (a, b, c, d, e) 
Instance details

Defined in Data.Vector.Unboxed.Base

(Unbox a, Unbox b, Unbox c, Unbox d, Unbox e, Unbox f) => Unbox (a, b, c, d, e, f) 
Instance details

Defined in Data.Vector.Unboxed.Base

data Vector a #

Boxed vectors, supporting efficient slicing.

Instances

Instances details
FromJSON1 Vector 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (Vector a) #

liftParseJSONList :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [Vector a] #

ToJSON1 Vector 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Value) -> ([a] -> Value) -> Vector a -> Value #

liftToJSONList :: (a -> Value) -> ([a] -> Value) -> [Vector a] -> Value #

liftToEncoding :: (a -> Encoding) -> ([a] -> Encoding) -> Vector a -> Encoding #

liftToEncodingList :: (a -> Encoding) -> ([a] -> Encoding) -> [Vector a] -> Encoding #

MonadFail Vector

Since: vector-0.12.1.0

Instance details

Defined in Data.Vector

Methods

fail :: String -> Vector a #

MonadFix Vector

This instance has the same semantics as the one for lists.

Since: vector-0.12.2.0

Instance details

Defined in Data.Vector

Methods

mfix :: (a -> Vector a) -> Vector a #

MonadZip Vector 
Instance details

Defined in Data.Vector

Methods

mzip :: Vector a -> Vector b -> Vector (a, b) #

mzipWith :: (a -> b -> c) -> Vector a -> Vector b -> Vector c #

munzip :: Vector (a, b) -> (Vector a, Vector b) #

Foldable Vector 
Instance details

Defined in Data.Vector

Methods

fold :: Monoid m => Vector m -> m #

foldMap :: Monoid m => (a -> m) -> Vector a -> m #

foldMap' :: Monoid m => (a -> m) -> Vector a -> m #

foldr :: (a -> b -> b) -> b -> Vector a -> b #

foldr' :: (a -> b -> b) -> b -> Vector a -> b #

foldl :: (b -> a -> b) -> b -> Vector a -> b #

foldl' :: (b -> a -> b) -> b -> Vector a -> b #

foldr1 :: (a -> a -> a) -> Vector a -> a #

foldl1 :: (a -> a -> a) -> Vector a -> a #

toList :: Vector a -> [a] #

null :: Vector a -> Bool #

length :: Vector a -> Int #

elem :: Eq a => a -> Vector a -> Bool #

maximum :: Ord a => Vector a -> a #

minimum :: Ord a => Vector a -> a #

sum :: Num a => Vector a -> a #

product :: Num a => Vector a -> a #

Eq1 Vector 
Instance details

Defined in Data.Vector

Methods

liftEq :: (a -> b -> Bool) -> Vector a -> Vector b -> Bool #

Ord1 Vector 
Instance details

Defined in Data.Vector

Methods

liftCompare :: (a -> b -> Ordering) -> Vector a -> Vector b -> Ordering #

Read1 Vector 
Instance details

Defined in Data.Vector

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (Vector a) #

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [Vector a] #

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (Vector a) #

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [Vector a] #

Show1 Vector 
Instance details

Defined in Data.Vector

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Vector a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Vector a] -> ShowS #

Traversable Vector 
Instance details

Defined in Data.Vector

Methods

traverse :: Applicative f => (a -> f b) -> Vector a -> f (Vector b) #

sequenceA :: Applicative f => Vector (f a) -> f (Vector a) #

mapM :: Monad m => (a -> m b) -> Vector a -> m (Vector b) #

sequence :: Monad m => Vector (m a) -> m (Vector a) #

Alternative Vector 
Instance details

Defined in Data.Vector

Methods

empty :: Vector a #

(<|>) :: Vector a -> Vector a -> Vector a #

some :: Vector a -> Vector [a] #

many :: Vector a -> Vector [a] #

Applicative Vector 
Instance details

Defined in Data.Vector

Methods

pure :: a -> Vector a #

(<*>) :: Vector (a -> b) -> Vector a -> Vector b #

liftA2 :: (a -> b -> c) -> Vector a -> Vector b -> Vector c #

(*>) :: Vector a -> Vector b -> Vector b #

(<*) :: Vector a -> Vector b -> Vector a #

Functor Vector 
Instance details

Defined in Data.Vector

Methods

fmap :: (a -> b) -> Vector a -> Vector b #

(<$) :: a -> Vector b -> Vector a #

Monad Vector 
Instance details

Defined in Data.Vector

Methods

(>>=) :: Vector a -> (a -> Vector b) -> Vector b #

(>>) :: Vector a -> Vector b -> Vector b #

return :: a -> Vector a #

MonadPlus Vector 
Instance details

Defined in Data.Vector

Methods

mzero :: Vector a #

mplus :: Vector a -> Vector a -> Vector a #

NFData1 Vector

Since: vector-0.12.1.0

Instance details

Defined in Data.Vector

Methods

liftRnf :: (a -> ()) -> Vector a -> () #

Vector Vector a 
Instance details

Defined in Data.Vector

Methods

basicUnsafeFreeze :: Mutable Vector s a -> ST s (Vector a) #

basicUnsafeThaw :: Vector a -> ST s (Mutable Vector s a) #

basicLength :: Vector a -> Int #

basicUnsafeSlice :: Int -> Int -> Vector a -> Vector a #

basicUnsafeIndexM :: Vector a -> Int -> Box a #

basicUnsafeCopy :: Mutable Vector s a -> Vector a -> ST s () #

elemseq :: Vector a -> a -> b -> b #

FromJSON a => FromJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON a => ToJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Data a => Data (Vector a) 
Instance details

Defined in Data.Vector

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Vector a -> c (Vector a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Vector a) #

toConstr :: Vector a -> Constr #

dataTypeOf :: Vector a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Vector a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Vector a)) #

gmapT :: (forall b. Data b => b -> b) -> Vector a -> Vector a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Vector a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Vector a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Vector a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Vector a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Vector a -> m (Vector a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Vector a -> m (Vector a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Vector a -> m (Vector a) #

Monoid (Vector a) 
Instance details

Defined in Data.Vector

Methods

mempty :: Vector a #

mappend :: Vector a -> Vector a -> Vector a #

mconcat :: [Vector a] -> Vector a #

Semigroup (Vector a) 
Instance details

Defined in Data.Vector

Methods

(<>) :: Vector a -> Vector a -> Vector a #

sconcat :: NonEmpty (Vector a) -> Vector a #

stimes :: Integral b => b -> Vector a -> Vector a #

IsList (Vector a) 
Instance details

Defined in Data.Vector

Associated Types

type Item (Vector a) #

Methods

fromList :: [Item (Vector a)] -> Vector a #

fromListN :: Int -> [Item (Vector a)] -> Vector a #

toList :: Vector a -> [Item (Vector a)] #

Read a => Read (Vector a) 
Instance details

Defined in Data.Vector

Show a => Show (Vector a) 
Instance details

Defined in Data.Vector

Methods

showsPrec :: Int -> Vector a -> ShowS #

show :: Vector a -> String #

showList :: [Vector a] -> ShowS #

NFData a => NFData (Vector a) 
Instance details

Defined in Data.Vector

Methods

rnf :: Vector a -> () #

Eq a => Eq (Vector a) 
Instance details

Defined in Data.Vector

Methods

(==) :: Vector a -> Vector a -> Bool #

(/=) :: Vector a -> Vector a -> Bool #

Ord a => Ord (Vector a) 
Instance details

Defined in Data.Vector

Methods

compare :: Vector a -> Vector a -> Ordering #

(<) :: Vector a -> Vector a -> Bool #

(<=) :: Vector a -> Vector a -> Bool #

(>) :: Vector a -> Vector a -> Bool #

(>=) :: Vector a -> Vector a -> Bool #

max :: Vector a -> Vector a -> Vector a #

min :: Vector a -> Vector a -> Vector a #

Ixed (Vector a) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (Vector a) -> Traversal' (Vector a) (IxValue (Vector a)) #

Wrapped (Vector a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Vector a) #

Methods

_Wrapped' :: Iso' (Vector a) (Unwrapped (Vector a)) #

GrowingAppend (Vector a) 
Instance details

Defined in Data.MonoTraversable

MonoFoldable (Vector a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (Vector a) -> m) -> Vector a -> m #

ofoldr :: (Element (Vector a) -> b -> b) -> b -> Vector a -> b #

ofoldl' :: (a0 -> Element (Vector a) -> a0) -> a0 -> Vector a -> a0 #

otoList :: Vector a -> [Element (Vector a)] #

oall :: (Element (Vector a) -> Bool) -> Vector a -> Bool #

oany :: (Element (Vector a) -> Bool) -> Vector a -> Bool #

onull :: Vector a -> Bool #

olength :: Vector a -> Int #

olength64 :: Vector a -> Int64 #

ocompareLength :: Integral i => Vector a -> i -> Ordering #

otraverse_ :: Applicative f => (Element (Vector a) -> f b) -> Vector a -> f () #

ofor_ :: Applicative f => Vector a -> (Element (Vector a) -> f b) -> f () #

omapM_ :: Applicative m => (Element (Vector a) -> m ()) -> Vector a -> m () #

oforM_ :: Applicative m => Vector a -> (Element (Vector a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (Vector a) -> m a0) -> a0 -> Vector a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (Vector a) -> m) -> Vector a -> m #

ofoldr1Ex :: (Element (Vector a) -> Element (Vector a) -> Element (Vector a)) -> Vector a -> Element (Vector a) #

ofoldl1Ex' :: (Element (Vector a) -> Element (Vector a) -> Element (Vector a)) -> Vector a -> Element (Vector a) #

headEx :: Vector a -> Element (Vector a) #

lastEx :: Vector a -> Element (Vector a) #

unsafeHead :: Vector a -> Element (Vector a) #

unsafeLast :: Vector a -> Element (Vector a) #

maximumByEx :: (Element (Vector a) -> Element (Vector a) -> Ordering) -> Vector a -> Element (Vector a) #

minimumByEx :: (Element (Vector a) -> Element (Vector a) -> Ordering) -> Vector a -> Element (Vector a) #

oelem :: Element (Vector a) -> Vector a -> Bool #

onotElem :: Element (Vector a) -> Vector a -> Bool #

MonoFunctor (Vector a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Vector a) -> Element (Vector a)) -> Vector a -> Vector a #

MonoPointed (Vector a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Vector a) -> Vector a #

MonoTraversable (Vector a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (Vector a) -> f (Element (Vector a))) -> Vector a -> f (Vector a) #

omapM :: Applicative m => (Element (Vector a) -> m (Element (Vector a))) -> Vector a -> m (Vector a) #

IsSequence (Vector a) 
Instance details

Defined in Data.Sequences

Methods

fromList :: [Element (Vector a)] -> Vector a #

lengthIndex :: Vector a -> Index (Vector a) #

break :: (Element (Vector a) -> Bool) -> Vector a -> (Vector a, Vector a) #

span :: (Element (Vector a) -> Bool) -> Vector a -> (Vector a, Vector a) #

dropWhile :: (Element (Vector a) -> Bool) -> Vector a -> Vector a #

takeWhile :: (Element (Vector a) -> Bool) -> Vector a -> Vector a #

splitAt :: Index (Vector a) -> Vector a -> (Vector a, Vector a) #

unsafeSplitAt :: Index (Vector a) -> Vector a -> (Vector a, Vector a) #

take :: Index (Vector a) -> Vector a -> Vector a #

unsafeTake :: Index (Vector a) -> Vector a -> Vector a #

drop :: Index (Vector a) -> Vector a -> Vector a #

unsafeDrop :: Index (Vector a) -> Vector a -> Vector a #

dropEnd :: Index (Vector a) -> Vector a -> Vector a #

partition :: (Element (Vector a) -> Bool) -> Vector a -> (Vector a, Vector a) #

uncons :: Vector a -> Maybe (Element (Vector a), Vector a) #

unsnoc :: Vector a -> Maybe (Vector a, Element (Vector a)) #

filter :: (Element (Vector a) -> Bool) -> Vector a -> Vector a #

filterM :: Monad m => (Element (Vector a) -> m Bool) -> Vector a -> m (Vector a) #

replicate :: Index (Vector a) -> Element (Vector a) -> Vector a #

replicateM :: Monad m => Index (Vector a) -> m (Element (Vector a)) -> m (Vector a) #

groupBy :: (Element (Vector a) -> Element (Vector a) -> Bool) -> Vector a -> [Vector a] #

groupAllOn :: Eq b => (Element (Vector a) -> b) -> Vector a -> [Vector a] #

subsequences :: Vector a -> [Vector a] #

permutations :: Vector a -> [Vector a] #

tailEx :: Vector a -> Vector a #

tailMay :: Vector a -> Maybe (Vector a) #

initEx :: Vector a -> Vector a #

initMay :: Vector a -> Maybe (Vector a) #

unsafeTail :: Vector a -> Vector a #

unsafeInit :: Vector a -> Vector a #

index :: Vector a -> Index (Vector a) -> Maybe (Element (Vector a)) #

indexEx :: Vector a -> Index (Vector a) -> Element (Vector a) #

unsafeIndex :: Vector a -> Index (Vector a) -> Element (Vector a) #

splitWhen :: (Element (Vector a) -> Bool) -> Vector a -> [Vector a] #

SemiSequence (Vector a) 
Instance details

Defined in Data.Sequences

Associated Types

type Index (Vector a) #

Methods

intersperse :: Element (Vector a) -> Vector a -> Vector a #

reverse :: Vector a -> Vector a #

find :: (Element (Vector a) -> Bool) -> Vector a -> Maybe (Element (Vector a)) #

sortBy :: (Element (Vector a) -> Element (Vector a) -> Ordering) -> Vector a -> Vector a #

cons :: Element (Vector a) -> Vector a -> Vector a #

snoc :: Vector a -> Element (Vector a) -> Vector a #

t ~ Vector a' => Rewrapped (Vector a) t 
Instance details

Defined in Control.Lens.Wrapped

type Mutable Vector 
Instance details

Defined in Data.Vector

type Item (Vector a) 
Instance details

Defined in Data.Vector

type Item (Vector a) = a
type Index (Vector a) 
Instance details

Defined in Control.Lens.At

type Index (Vector a) = Int
type IxValue (Vector a) 
Instance details

Defined in Control.Lens.At

type IxValue (Vector a) = a
type Unwrapped (Vector a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (Vector a) = [a]
type Element (Vector a) 
Instance details

Defined in Data.MonoTraversable

type Element (Vector a) = a
type Index (Vector a) 
Instance details

Defined in Data.Sequences

type Index (Vector a) = Int

type Reader r = ReaderT r Identity #

The parameterizable reader monad.

Computations are functions of a shared environment.

The return function ignores the environment, while >>= passes the inherited environment to both subcomputations.

lens :: (s -> a) -> (s -> b -> t) -> Lens s t a b #

lens creates a Lens from a getter and a setter. The resulting lens isn't the most effective one (because of having to traverse the structure twice when modifying), but it shouldn't matter much.

A (partial) lens for list indexing:

ix :: Int -> Lens' [a] a
ix i = lens (!! i)                                   -- getter
            (\s b -> take i s ++ b : drop (i+1) s)   -- setter

Usage:

>>> [1..9] ^. ix 3
4

>>> [1..9] & ix 3 %~ negate
[1,2,3,-4,5,6,7,8,9]

When getting, the setter is completely unused; when setting, the getter is unused. Both are used only when the value is being modified. For instance, here we define a lens for the 1st element of a list, but instead of a legitimate getter we use undefined. Then we use the resulting lens for setting and it works, which proves that the getter wasn't used:

>>> [1,2,3] & lens undefined (\s b -> b : tail s) .~ 10
[10,2,3]

(^?) :: s -> Getting (First a) s a -> Maybe a infixl 8 #

s ^? t returns the 1st element t returns, or Nothing if t doesn't return anything. It's trivially implemented by passing the First monoid to the getter.

Safe head:

>>> [] ^? each
Nothing
>>> [1..3] ^? each
Just 1

Converting Either to Maybe:

>>> Left 1 ^? _Right
Nothing
>>> Right 1 ^? _Right
Just 1

A non-operator version of (^?) is called preview, and – like view – it's a bit more general than (^?) (it works in MonadReader). If you need the general version, you can get it from microlens-mtl; otherwise there's preview available in Lens.Micro.Extras.

(^..) :: s -> Getting (Endo [a]) s a -> [a] infixl 8 #

s ^.. t returns the list of all values that t gets from s.

A Maybe contains either 0 or 1 values:

>>> Just 3 ^.. _Just
[3]

Gathering all values in a list of tuples:

>>> [(1,2),(3,4)] ^.. each.each
[1,2,3,4]

to :: (s -> a) -> SimpleGetter s a #

to creates a getter from any function:

a ^. to f = f a

It's most useful in chains, because it lets you mix lenses and ordinary functions. Suppose you have a record which comes from some third-party library and doesn't have any lens accessors. You want to do something like this:

value ^. _1 . field . at 2

However, field isn't a getter, and you have to do this instead:

field (value ^. _1) ^. at 2

but now value is in the middle and it's hard to read the resulting code. A variant with to is prettier and more readable:

value ^. _1 . to field . at 2

(^.) :: s -> Getting a s a -> a infixl 8 #

(^.) applies a getter to a value; in other words, it gets a value out of a structure using a getter (which can be a lens, traversal, fold, etc.).

Getting 1st field of a tuple:

(^. _1) :: (a, b) -> a
(^. _1) = fst

When (^.) is used with a traversal, it combines all results using the Monoid instance for the resulting type. For instance, for lists it would be simple concatenation:

>>> ("str","ing") ^. each
"string"

The reason for this is that traversals use Applicative, and the Applicative instance for Const uses monoid concatenation to combine “effects” of Const.

A non-operator version of (^.) is called view, and it's a bit more general than (^.) (it works in MonadReader). If you need the general version, you can get it from microlens-mtl; otherwise there's view available in Lens.Micro.Extras.

set :: ASetter s t a b -> b -> s -> t #

set is a synonym for (.~).

Setting the 1st component of a pair:

set _1 :: x -> (a, b) -> (x, b)
set _1 = \x t -> (x, snd t)

Using it to rewrite (<$):

set mapped :: Functor f => a -> f b -> f a
set mapped = (<$)

(.~) :: ASetter s t a b -> b -> s -> t infixr 4 #

(.~) assigns a value to the target. It's the same thing as using (%~) with const:

l .~ x = l %~ const x

See set if you want a non-operator synonym.

Here it is used to change 2 fields of a 3-tuple:

>>> (0,0,0) & _1 .~ 1 & _3 .~ 3
(1,0,3)

over :: ASetter s t a b -> (a -> b) -> s -> t #

over is a synonym for (%~).

Getting fmap in a roundabout way:

over mapped :: Functor f => (a -> b) -> f a -> f b
over mapped = fmap

Applying a function to both components of a pair:

over both :: (a -> b) -> (a, a) -> (b, b)
over both = \f t -> (f (fst t), f (snd t))

Using over _2 as a replacement for second:

>>> over _2 show (10,20)
(10,"20")

(%~) :: ASetter s t a b -> (a -> b) -> s -> t infixr 4 #

(%~) applies a function to the target; an alternative explanation is that it is an inverse of sets, which turns a setter into an ordinary function. mapped %~ reverse is the same thing as fmap reverse.

See over if you want a non-operator synonym.

Negating the 1st element of a pair:

>>> (1,2) & _1 %~ negate
(-1,2)

Turning all Lefts in a list to upper case:

>>> (mapped._Left.mapped %~ toUpper) [Left "foo", Right "bar"]
[Left "FOO",Right "bar"]

sets :: ((a -> b) -> s -> t) -> ASetter s t a b #

sets creates an ASetter from an ordinary function. (The only thing it does is wrapping and unwrapping Identity.)

type ASetter s t a b = (a -> Identity b) -> s -> Identity t #

ASetter s t a b is something that turns a function modifying a value into a function modifying a structure. If you ignore Identity (as Identity a is the same thing as a), the type is:

type ASetter s t a b = (a -> b) -> s -> t

The reason Identity is used here is for ASetter to be composable with other types, such as Lens.

Technically, if you're writing a library, you shouldn't use this type for setters you are exporting from your library; the right type to use is Setter, but it is not provided by this package (because then it'd have to depend on distributive). It's completely alright, however, to export functions which take an ASetter as an argument.

type ASetter' s a = ASetter s s a a #

This is a type alias for monomorphic setters which don't change the type of the container (or of the value inside). It's useful more often than the same type in lens, because we can't provide real setters and so it does the job of both ASetter' and Setter'.

type SimpleGetter s a = forall r. Getting r s a #

A SimpleGetter s a extracts a from s; so, it's the same thing as (s -> a), but you can use it in lens chains because its type looks like this:

type SimpleGetter s a =
  forall r. (a -> Const r a) -> s -> Const r s

Since Const r is a functor, SimpleGetter has the same shape as other lens types and can be composed with them. To get (s -> a) out of a SimpleGetter, choose r ~ a and feed Const :: a -> Const a a to the getter:

-- the actual signature is more permissive:
-- view :: Getting a s a -> s -> a
view :: SimpleGetter s a -> s -> a
view getter = getConst . getter Const

The actual Getter from lens is more general:

type Getter s a =
  forall f. (Contravariant f, Functor f) => (a -> f a) -> s -> f s

I'm not currently aware of any functions that take lens's Getter but won't accept SimpleGetter, but you should try to avoid exporting SimpleGetters anyway to minimise confusion. Alternatively, look at microlens-contra, which provides a fully lens-compatible Getter.

Lens users: you can convert a SimpleGetter to Getter by applying to . view to it.

type Getting r s a = (a -> Const r a) -> s -> Const r s #

Functions that operate on getters and folds – such as (^.), (^..), (^?) – use Getter r s a (with different values of r) to describe what kind of result they need. For instance, (^.) needs the getter to be able to return a single value, and so it accepts a getter of type Getting a s a. (^..) wants the getter to gather values together, so it uses Getting (Endo [a]) s a (it could've used Getting [a] s a instead, but it's faster with Endo). The choice of r depends on what you want to do with elements you're extracting from s.

type Lens s t a b = forall (f :: Type -> Type). Functor f => (a -> f b) -> s -> f t #

Lens s t a b is the lowest common denominator of a setter and a getter, something that has the power of both; it has a Functor constraint, and since both Const and Identity are functors, it can be used whenever a getter or a setter is needed.

  • a is the type of the value inside of structure
  • b is the type of the replaced value
  • s is the type of the whole structure
  • t is the type of the structure after replacing a in it with b

type Lens' s a = Lens s s a a #

This is a type alias for monomorphic lenses which don't change the type of the container (or of the value inside).

asks #

Arguments

:: MonadReader r m 
=> (r -> a)

The selector function to apply to the environment.

-> m a 

Retrieves a function of the current environment.

preview :: MonadReader s m => Getting (First a) s a -> m (Maybe a) #

preview is a synonym for (^?), generalised for MonadReader (just like view, which is a synonym for (^.)).

>>> preview each [1..5]
Just 1

view :: MonadReader s m => Getting a s a -> m a #

view is a synonym for (^.), generalised for MonadReader (we are able to use it instead of (^.) since functions are instances of the MonadReader class):

>>> view _1 (1, 2)
1

When you're using Reader for config and your config type has lenses generated for it, most of the time you'll be using view instead of asks:

doSomething :: (MonadReader Config m) => m Int
doSomething = do
  thingy        <- view setting1  -- same as “asks (^. setting1)”
  anotherThingy <- view setting2
  ...

runReader #

Arguments

:: Reader r a

A Reader to run.

-> r

An initial environment.

-> a 

Runs a Reader and extracts the final value from it. (The inverse of reader.)

newChan :: MonadIO m => m (Chan a) #

Lifted newChan.

Since: unliftio-0.1.0.0

writeChan :: MonadIO m => Chan a -> a -> m () #

Lifted writeChan.

Since: unliftio-0.1.0.0

readChan :: MonadIO m => Chan a -> m a #

Lifted readChan.

Since: unliftio-0.1.0.0

dupChan :: MonadIO m => Chan a -> m (Chan a) #

Lifted dupChan.

Since: unliftio-0.1.0.0

getChanContents :: MonadIO m => Chan a -> m [a] #

Lifted getChanContents.

Since: unliftio-0.1.0.0

writeList2Chan :: MonadIO m => Chan a -> [a] -> m () #

Lifted writeList2Chan.

Since: unliftio-0.1.0.0

data StringException #

Exception type thrown by throwString.

Note that the second field of the data constructor depends on GHC/base version. For base 4.9 and GHC 8.0 and later, the second field is a call stack. Previous versions of GHC and base do not support call stacks, and the field is simply unit (provided to make pattern matching across GHC versions easier).

Since: unliftio-0.1.0.0

Instances

Instances details
Exception StringException

Since: unliftio-0.1.0.0

Instance details

Defined in UnliftIO.Exception

Show StringException

Since: unliftio-0.1.0.0

Instance details

Defined in UnliftIO.Exception

Eq StringException

Since: unliftio-0.2.19

Instance details

Defined in UnliftIO.Exception

catch #

Arguments

:: (MonadUnliftIO m, Exception e) 
=> m a

action

-> (e -> m a)

handler

-> m a 

Catch a synchronous (but not asynchronous) exception and recover from it.

This is parameterized on the exception type. To catch all synchronous exceptions, use catchAny.

Since: unliftio-0.1.0.0

catchIO :: MonadUnliftIO m => m a -> (IOException -> m a) -> m a #

catch specialized to only catching IOExceptions.

Since: unliftio-0.1.0.0

catchAny :: MonadUnliftIO m => m a -> (SomeException -> m a) -> m a #

catch specialized to catch all synchronous exceptions.

Since: unliftio-0.1.0.0

catchDeep :: (MonadUnliftIO m, Exception e, NFData a) => m a -> (e -> m a) -> m a #

Same as catch, but fully force evaluation of the result value to find all impure exceptions.

Since: unliftio-0.1.0.0

catchAnyDeep :: (NFData a, MonadUnliftIO m) => m a -> (SomeException -> m a) -> m a #

catchDeep specialized to catch all synchronous exception.

Since: unliftio-0.1.0.0

catchJust :: (MonadUnliftIO m, Exception e) => (e -> Maybe b) -> m a -> (b -> m a) -> m a #

catchJust is like catch but it takes an extra argument which is an exception predicate, a function which selects which type of exceptions we're interested in.

Since: unliftio-0.1.0.0

catchSyncOrAsync :: (MonadUnliftIO m, Exception e) => m a -> (e -> m a) -> m a #

A variant of catch that catches both synchronous and asynchronous exceptions.

WARNING: This function (and other *SyncOrAsync functions) is for advanced users. Most of the time, you probably want to use the non-SyncOrAsync versions.

Before attempting to use this function, be familiar with the "Rules for async safe handling" section in this blog post.

Since: unliftio-0.2.17

handle :: (MonadUnliftIO m, Exception e) => (e -> m a) -> m a -> m a #

Flipped version of catch.

Since: unliftio-0.1.0.0

handleIO :: MonadUnliftIO m => (IOException -> m a) -> m a -> m a #

handle specialized to only catching IOExceptions.

Since: unliftio-0.1.0.0

handleAny :: MonadUnliftIO m => (SomeException -> m a) -> m a -> m a #

Flipped version of catchAny.

Since: unliftio-0.1.0.0

handleDeep :: (MonadUnliftIO m, Exception e, NFData a) => (e -> m a) -> m a -> m a #

Flipped version of catchDeep.

Since: unliftio-0.1.0.0

handleAnyDeep :: (MonadUnliftIO m, NFData a) => (SomeException -> m a) -> m a -> m a #

Flipped version of catchAnyDeep.

Since: unliftio-0.1.0.0

handleJust :: (MonadUnliftIO m, Exception e) => (e -> Maybe b) -> (b -> m a) -> m a -> m a #

Flipped catchJust.

Since: unliftio-0.1.0.0

handleSyncOrAsync :: (MonadUnliftIO m, Exception e) => (e -> m a) -> m a -> m a #

A variant of handle that catches both synchronous and asynchronous exceptions.

See catchSyncOrAsync.

Since: unliftio-0.2.17

try :: (MonadUnliftIO m, Exception e) => m a -> m (Either e a) #

Run the given action and catch any synchronous exceptions as a Left value.

This is parameterized on the exception type. To catch all synchronous exceptions, use tryAny.

Since: unliftio-0.1.0.0

tryIO :: MonadUnliftIO m => m a -> m (Either IOException a) #

try specialized to only catching IOExceptions.

Since: unliftio-0.1.0.0

tryAny :: MonadUnliftIO m => m a -> m (Either SomeException a) #

try specialized to catch all synchronous exceptions.

Since: unliftio-0.1.0.0

tryDeep :: (MonadUnliftIO m, Exception e, NFData a) => m a -> m (Either e a) #

Same as try, but fully force evaluation of the result value to find all impure exceptions.

Since: unliftio-0.1.0.0

tryAnyDeep :: (MonadUnliftIO m, NFData a) => m a -> m (Either SomeException a) #

tryDeep specialized to catch all synchronous exceptions.

Since: unliftio-0.1.0.0

tryJust :: (MonadUnliftIO m, Exception e) => (e -> Maybe b) -> m a -> m (Either b a) #

A variant of try that takes an exception predicate to select which exceptions are caught.

Since: unliftio-0.1.0.0

trySyncOrAsync :: (MonadUnliftIO m, Exception e) => m a -> m (Either e a) #

A variant of try that catches both synchronous and asynchronous exceptions.

See catchSyncOrAsync.

Since: unliftio-0.2.17

pureTry :: a -> Either SomeException a #

Evaluate the value to WHNF and catch any synchronous exceptions.

The expression may still have bottom values within it; you may instead want to use pureTryDeep.

Since: unliftio-0.2.2.0

pureTryDeep :: NFData a => a -> Either SomeException a #

Evaluate the value to NF and catch any synchronous exceptions.

Since: unliftio-0.2.2.0

catches :: MonadUnliftIO m => m a -> [Handler m a] -> m a #

Similar to catch, but provides multiple different handler functions.

For more information on motivation, see base's catches. Note that, unlike that function, this function will not catch asynchronous exceptions.

Since: unliftio-0.1.0.0

catchesDeep :: (MonadUnliftIO m, NFData a) => m a -> [Handler m a] -> m a #

Same as catches, but fully force evaluation of the result value to find all impure exceptions.

Since: unliftio-0.1.0.0

evaluate :: MonadIO m => a -> m a #

Lifted version of evaluate.

Since: unliftio-0.1.0.0

evaluateDeep :: (MonadIO m, NFData a) => a -> m a #

Deeply evaluate a value using evaluate and NFData.

Since: unliftio-0.1.0.0

bracket :: MonadUnliftIO m => m a -> (a -> m b) -> (a -> m c) -> m c #

Allocate and clean up a resource safely.

For more information on motivation and usage of this function, see base's bracket. This function has two differences from the one in base. The first, and more obvious, is that it works on any MonadUnliftIO instance, not just IO.

The more subtle difference is that this function will use uninterruptible masking for its cleanup handler. This is a subtle distinction, but at a high level, means that resource cleanup has more guarantees to complete. This comes at the cost that an incorrectly written cleanup function cannot be interrupted.

For more information, please see https://github.com/fpco/safe-exceptions/issues/3.

Since: unliftio-0.1.0.0

bracket_ :: MonadUnliftIO m => m a -> m b -> m c -> m c #

Same as bracket, but does not pass the acquired resource to cleanup and use functions.

For more information, see base's bracket_.

Since: unliftio-0.1.0.0

bracketOnError :: MonadUnliftIO m => m a -> (a -> m b) -> (a -> m c) -> m c #

Same as bracket, but only perform the cleanup if an exception is thrown.

Since: unliftio-0.1.0.0

bracketOnError_ :: MonadUnliftIO m => m a -> m b -> m c -> m c #

A variant of bracketOnError where the return value from the first computation is not required.

Since: unliftio-0.1.0.0

finally #

Arguments

:: MonadUnliftIO m 
=> m a

thing

-> m b

after

-> m a 

Perform thing, guaranteeing that after will run after, even if an exception occurs.

Same interruptible vs uninterrupible points apply as with bracket. See base's finally for more information.

Since: unliftio-0.1.0.0

withException :: (MonadUnliftIO m, Exception e) => m a -> (e -> m b) -> m a #

Like onException, but provides the handler the thrown exception.

Since: unliftio-0.1.0.0

onException :: MonadUnliftIO m => m a -> m b -> m a #

Like finally, but only call after if an exception occurs.

Since: unliftio-0.1.0.0

toSyncException :: Exception e => e -> SomeException #

Convert an exception into a synchronous exception.

For synchronous exceptions, this is the same as toException. For asynchronous exceptions, this will wrap up the exception with SyncExceptionWrapper.

Since: unliftio-0.1.0.0

toAsyncException :: Exception e => e -> SomeException #

Convert an exception into an asynchronous exception.

For asynchronous exceptions, this is the same as toException. For synchronous exceptions, this will wrap up the exception with AsyncExceptionWrapper.

Since: unliftio-0.1.0.0

fromExceptionUnwrap :: Exception e => SomeException -> Maybe e #

Convert from a possibly wrapped exception.

The inverse of toAsyncException and toSyncException. When using those functions (or functions that use them, like throwTo or throwIO), fromException might not be sufficient because the exception might be wrapped within SyncExceptionWrapper or AsyncExceptionWrapper.

Since: unliftio-0.2.17

isSyncException :: Exception e => e -> Bool #

Check if the given exception is synchronous.

Since: unliftio-0.1.0.0

isAsyncException :: Exception e => e -> Bool #

Check if the given exception is asynchronous.

Since: unliftio-0.1.0.0

mask :: MonadUnliftIO m => ((forall a. m a -> m a) -> m b) -> m b #

Unlifted version of mask.

Since: unliftio-0.1.0.0

uninterruptibleMask :: MonadUnliftIO m => ((forall a. m a -> m a) -> m b) -> m b #

Unlifted version of uninterruptibleMask.

Since: unliftio-0.1.0.0

mask_ :: MonadUnliftIO m => m a -> m a #

Unlifted version of mask_.

Since: unliftio-0.1.0.0

uninterruptibleMask_ :: MonadUnliftIO m => m a -> m a #

Unlifted version of uninterruptibleMask_.

Since: unliftio-0.1.0.0

stringException :: HasCallStack => String -> StringException #

Smart constructor for a StringException that deals with the call stack.

Since: unliftio-0.1.0.0

throwTo :: (Exception e, MonadIO m) => ThreadId -> e -> m () #

Throw an asynchronous exception to another thread.

Synchronously typed exceptions will be wrapped into an AsyncExceptionWrapper, see https://github.com/fpco/safe-exceptions#determining-sync-vs-async.

It's usually a better idea to use the UnliftIO.Async module, see https://github.com/fpco/safe-exceptions#quickstart.

Since: unliftio-0.1.0.0

impureThrow :: Exception e => e -> a #

Generate a pure value which, when forced, will synchronously throw the given exception.

Generally it's better to avoid using this function and instead use throwIO, see https://github.com/fpco/safe-exceptions#quickstart.

Since: unliftio-0.1.0.0

fromEither :: (Exception e, MonadIO m) => Either e a -> m a #

Unwrap an Either value, throwing its Left value as a runtime exception via throwIO if present.

Since: unliftio-0.1.0.0

fromEitherIO :: (Exception e, MonadIO m) => IO (Either e a) -> m a #

Same as fromEither, but works on an IO-wrapped Either.

Since: unliftio-0.1.0.0

fromEitherM :: (Exception e, MonadIO m) => m (Either e a) -> m a #

Same as fromEither, but works on an m-wrapped Either.

Since: unliftio-0.1.0.0

mapExceptionM :: (Exception e1, Exception e2, MonadUnliftIO m) => (e1 -> e2) -> m a -> m a #

Same as mapException, except works in a monadic context.

Since: unliftio-0.2.15

withFile :: MonadUnliftIO m => FilePath -> IOMode -> (Handle -> m a) -> m a #

Unlifted version of withFile.

Since: unliftio-0.1.0.0

openFile :: MonadIO m => FilePath -> IOMode -> m Handle #

Lifted version of openFile

Since: unliftio-0.2.20

hClose :: MonadIO m => Handle -> m () #

Lifted version of hClose

Since: unliftio-0.2.1.0

hFlush :: MonadIO m => Handle -> m () #

Lifted version of hFlush

Since: unliftio-0.2.1.0

hFileSize :: MonadIO m => Handle -> m Integer #

Lifted version of hFileSize

Since: unliftio-0.2.1.0

hSetFileSize :: MonadIO m => Handle -> Integer -> m () #

Lifted version of hSetFileSize

Since: unliftio-0.2.1.0

hIsEOF :: MonadIO m => Handle -> m Bool #

Lifted version of hIsEOF

Since: unliftio-0.2.1.0

hSetBuffering :: MonadIO m => Handle -> BufferMode -> m () #

Lifted version of hSetBuffering

Since: unliftio-0.2.1.0

hGetBuffering :: MonadIO m => Handle -> m BufferMode #

Lifted version of hGetBuffering

Since: unliftio-0.2.1.0

hSeek :: MonadIO m => Handle -> SeekMode -> Integer -> m () #

Lifted version of hSeek

Since: unliftio-0.2.1.0

hTell :: MonadIO m => Handle -> m Integer #

Lifted version of hTell

Since: unliftio-0.2.1.0

hIsOpen :: MonadIO m => Handle -> m Bool #

Lifted version of hIsOpen

Since: unliftio-0.2.1.0

hIsClosed :: MonadIO m => Handle -> m Bool #

Lifted version of hIsClosed

Since: unliftio-0.2.1.0

hIsReadable :: MonadIO m => Handle -> m Bool #

Lifted version of hIsReadable

Since: unliftio-0.2.1.0

hIsWritable :: MonadIO m => Handle -> m Bool #

Lifted version of hIsWritable

Since: unliftio-0.2.1.0

hIsSeekable :: MonadIO m => Handle -> m Bool #

Lifted version of hIsSeekable

Since: unliftio-0.2.1.0

hIsTerminalDevice :: MonadIO m => Handle -> m Bool #

Lifted version of hIsTerminalDevice

Since: unliftio-0.2.1.0

hSetEcho :: MonadIO m => Handle -> Bool -> m () #

Lifted version of hSetEcho

Since: unliftio-0.2.1.0

hGetEcho :: MonadIO m => Handle -> m Bool #

Lifted version of hGetEcho

Since: unliftio-0.2.1.0

hWaitForInput :: MonadIO m => Handle -> Int -> m Bool #

Lifted version of hWaitForInput

Since: unliftio-0.2.1.0

hReady :: MonadIO m => Handle -> m Bool #

Lifted version of hReady

Since: unliftio-0.2.1.0

getMonotonicTime :: MonadIO m => m Double #

Get the number of seconds which have passed since an arbitrary starting time, useful for calculating runtime in a program.

Since: unliftio-0.2.3.0

newIORef :: MonadIO m => a -> m (IORef a) #

Lifted newIORef.

Since: unliftio-0.1.0.0

readIORef :: MonadIO m => IORef a -> m a #

Lifted readIORef.

Since: unliftio-0.1.0.0

writeIORef :: MonadIO m => IORef a -> a -> m () #

Lifted writeIORef.

Since: unliftio-0.1.0.0

modifyIORef :: MonadIO m => IORef a -> (a -> a) -> m () #

Lifted modifyIORef.

Since: unliftio-0.1.0.0

modifyIORef' :: MonadIO m => IORef a -> (a -> a) -> m () #

Lifted modifyIORef'.

Since: unliftio-0.1.0.0

atomicModifyIORef :: MonadIO m => IORef a -> (a -> (a, b)) -> m b #

Lifted atomicModifyIORef.

Since: unliftio-0.1.0.0

atomicModifyIORef' :: MonadIO m => IORef a -> (a -> (a, b)) -> m b #

Lifted atomicModifyIORef'.

Since: unliftio-0.1.0.0

atomicWriteIORef :: MonadIO m => IORef a -> a -> m () #

Lifted atomicWriteIORef.

Since: unliftio-0.1.0.0

mkWeakIORef :: MonadUnliftIO m => IORef a -> m () -> m (Weak (IORef a)) #

Unlifted mkWeakIORef.

Since: unliftio-0.1.0.0

data ConcException #

Things that can go wrong in the structure of a Conc. These are programmer errors.

Since: unliftio-0.2.9.0

Instances

Instances details
Exception ConcException 
Instance details

Defined in UnliftIO.Internals.Async

Generic ConcException 
Instance details

Defined in UnliftIO.Internals.Async

Associated Types

type Rep ConcException :: Type -> Type #

Show ConcException 
Instance details

Defined in UnliftIO.Internals.Async

Eq ConcException 
Instance details

Defined in UnliftIO.Internals.Async

Ord ConcException 
Instance details

Defined in UnliftIO.Internals.Async

type Rep ConcException 
Instance details

Defined in UnliftIO.Internals.Async

type Rep ConcException = D1 ('MetaData "ConcException" "UnliftIO.Internals.Async" "unliftio-0.2.25.0-Cin3NvA5fXkCe3USvjdfCU" 'False) (C1 ('MetaCons "EmptyWithNoAlternative" 'PrefixI 'False) (U1 :: Type -> Type))

data Conc (m :: TYPE LiftedRep -> Type) a #

A more efficient alternative to Concurrently, which reduces the number of threads that need to be forked. For more information, see this blog post. This is provided as a separate type to Concurrently as it has a slightly different API.

Use the conc function to construct values of type Conc, and runConc to execute the composed actions. You can use the Applicative instance to run different actions and wait for all of them to complete, or the Alternative instance to wait for the first thread to complete.

In the event of a runtime exception thrown by any of the children threads, or an asynchronous exception received in the parent thread, all threads will be killed with an AsyncCancelled exception and the original exception rethrown. If multiple exceptions are generated by different threads, there are no guarantees on which exception will end up getting rethrown.

For many common use cases, you may prefer using helper functions in this module like mapConcurrently.

There are some intentional differences in behavior to Concurrently:

  • Children threads are always launched in an unmasked state, not the inherited state of the parent thread.

Note that it is a programmer error to use the Alternative instance in such a way that there are no alternatives to an empty, e.g. runConc (empty | empty). In such a case, a ConcException will be thrown. If there was an Alternative in the standard libraries without empty, this library would use it instead.

Since: unliftio-0.2.9.0

Instances

Instances details
MonadUnliftIO m => Alternative (Conc m)

Since: unliftio-0.2.9.0

Instance details

Defined in UnliftIO.Internals.Async

Methods

empty :: Conc m a #

(<|>) :: Conc m a -> Conc m a -> Conc m a #

some :: Conc m a -> Conc m [a] #

many :: Conc m a -> Conc m [a] #

MonadUnliftIO m => Applicative (Conc m)

Since: unliftio-0.2.9.0

Instance details

Defined in UnliftIO.Internals.Async

Methods

pure :: a -> Conc m a #

(<*>) :: Conc m (a -> b) -> Conc m a -> Conc m b #

liftA2 :: (a -> b -> c) -> Conc m a -> Conc m b -> Conc m c #

(*>) :: Conc m a -> Conc m b -> Conc m b #

(<*) :: Conc m a -> Conc m b -> Conc m a #

Functor m => Functor (Conc m) 
Instance details

Defined in UnliftIO.Internals.Async

Methods

fmap :: (a -> b) -> Conc m a -> Conc m b #

(<$) :: a -> Conc m b -> Conc m a #

(Monoid a, MonadUnliftIO m) => Monoid (Conc m a)

Since: unliftio-0.2.9.0

Instance details

Defined in UnliftIO.Internals.Async

Methods

mempty :: Conc m a #

mappend :: Conc m a -> Conc m a -> Conc m a #

mconcat :: [Conc m a] -> Conc m a #

(MonadUnliftIO m, Semigroup a) => Semigroup (Conc m a)

Since: unliftio-0.2.9.0

Instance details

Defined in UnliftIO.Internals.Async

Methods

(<>) :: Conc m a -> Conc m a -> Conc m a #

sconcat :: NonEmpty (Conc m a) -> Conc m a #

stimes :: Integral b => b -> Conc m a -> Conc m a #

newtype Concurrently (m :: Type -> Type) a #

Unlifted Concurrently.

Since: unliftio-0.1.0.0

Constructors

Concurrently 

Fields

Instances

Instances details
MonadUnliftIO m => Alternative (Concurrently m)

Composing two unlifted Concurrently values using Alternative is the equivalent to using a race combinator, the asynchrounous sub-routine that returns a value first is the one that gets it's value returned, the slowest sub-routine gets cancelled and it's thread is killed.

Since: unliftio-0.1.0.0

Instance details

Defined in UnliftIO.Internals.Async

Methods

empty :: Concurrently m a #

(<|>) :: Concurrently m a -> Concurrently m a -> Concurrently m a #

some :: Concurrently m a -> Concurrently m [a] #

many :: Concurrently m a -> Concurrently m [a] #

MonadUnliftIO m => Applicative (Concurrently m)

Since: unliftio-0.1.0.0

Instance details

Defined in UnliftIO.Internals.Async

Methods

pure :: a -> Concurrently m a #

(<*>) :: Concurrently m (a -> b) -> Concurrently m a -> Concurrently m b #

liftA2 :: (a -> b -> c) -> Concurrently m a -> Concurrently m b -> Concurrently m c #

(*>) :: Concurrently m a -> Concurrently m b -> Concurrently m b #

(<*) :: Concurrently m a -> Concurrently m b -> Concurrently m a #

Monad m => Functor (Concurrently m)

Since: unliftio-0.1.0.0

Instance details

Defined in UnliftIO.Internals.Async

Methods

fmap :: (a -> b) -> Concurrently m a -> Concurrently m b #

(<$) :: a -> Concurrently m b -> Concurrently m a #

(Semigroup a, Monoid a, MonadUnliftIO m) => Monoid (Concurrently m a)

Since: unliftio-0.1.0.0

Instance details

Defined in UnliftIO.Internals.Async

(MonadUnliftIO m, Semigroup a) => Semigroup (Concurrently m a)

Only defined by async for base >= 4.9.

Since: unliftio-0.1.0.0

Instance details

Defined in UnliftIO.Internals.Async

Methods

(<>) :: Concurrently m a -> Concurrently m a -> Concurrently m a #

sconcat :: NonEmpty (Concurrently m a) -> Concurrently m a #

stimes :: Integral b => b -> Concurrently m a -> Concurrently m a #

async :: MonadUnliftIO m => m a -> m (Async a) #

Unlifted async.

Since: unliftio-0.1.0.0

asyncBound :: MonadUnliftIO m => m a -> m (Async a) #

Unlifted asyncBound.

Since: unliftio-0.1.0.0

asyncOn :: MonadUnliftIO m => Int -> m a -> m (Async a) #

Unlifted asyncOn.

Since: unliftio-0.1.0.0

asyncWithUnmask :: MonadUnliftIO m => ((forall b. m b -> m b) -> m a) -> m (Async a) #

Unlifted asyncWithUnmask.

Since: unliftio-0.1.0.0

asyncOnWithUnmask :: MonadUnliftIO m => Int -> ((forall b. m b -> m b) -> m a) -> m (Async a) #

Unlifted asyncOnWithUnmask.

Since: unliftio-0.1.0.0

withAsync :: MonadUnliftIO m => m a -> (Async a -> m b) -> m b #

Unlifted withAsync.

Since: unliftio-0.1.0.0

withAsyncBound :: MonadUnliftIO m => m a -> (Async a -> m b) -> m b #

Unlifted withAsyncBound.

Since: unliftio-0.1.0.0

withAsyncOn :: MonadUnliftIO m => Int -> m a -> (Async a -> m b) -> m b #

Unlifted withAsyncOn.

Since: unliftio-0.1.0.0

withAsyncWithUnmask :: MonadUnliftIO m => ((forall c. m c -> m c) -> m a) -> (Async a -> m b) -> m b #

Unlifted withAsyncWithUnmask.

Since: unliftio-0.1.0.0

withAsyncOnWithUnmask :: MonadUnliftIO m => Int -> ((forall c. m c -> m c) -> m a) -> (Async a -> m b) -> m b #

Unlifted withAsyncOnWithMask.

Since: unliftio-0.1.0.0

wait :: MonadIO m => Async a -> m a #

Lifted wait.

Since: unliftio-0.1.0.0

poll :: MonadIO m => Async a -> m (Maybe (Either SomeException a)) #

Lifted poll.

Since: unliftio-0.1.0.0

waitCatch :: MonadIO m => Async a -> m (Either SomeException a) #

Lifted waitCatch.

Since: unliftio-0.1.0.0

cancel :: MonadIO m => Async a -> m () #

Lifted cancel.

Since: unliftio-0.1.0.0

uninterruptibleCancel :: MonadIO m => Async a -> m () #

Lifted uninterruptibleCancel.

Since: unliftio-0.1.0.0

cancelWith :: (Exception e, MonadIO m) => Async a -> e -> m () #

Lifted cancelWith. Additionally uses toAsyncException to ensure async exception safety.

Since: unliftio-0.1.0.0

waitAny :: MonadIO m => [Async a] -> m (Async a, a) #

Lifted waitAny.

Since: unliftio-0.1.0.0

waitAnyCatch :: MonadIO m => [Async a] -> m (Async a, Either SomeException a) #

Lifted waitAnyCatch.

Since: unliftio-0.1.0.0

waitAnyCancel :: MonadIO m => [Async a] -> m (Async a, a) #

Lifted waitAnyCancel.

Since: unliftio-0.1.0.0

waitAnyCatchCancel :: MonadIO m => [Async a] -> m (Async a, Either SomeException a) #

Lifted waitAnyCatchCancel.

Since: unliftio-0.1.0.0

waitEither :: MonadIO m => Async a -> Async b -> m (Either a b) #

Lifted waitEither.

Since: unliftio-0.1.0.0

waitEitherCatch :: MonadIO m => Async a -> Async b -> m (Either (Either SomeException a) (Either SomeException b)) #

Lifted waitEitherCatch.

Since: unliftio-0.1.0.0

waitEitherCancel :: MonadIO m => Async a -> Async b -> m (Either a b) #

Lifted waitEitherCancel.

Since: unliftio-0.1.0.0

waitEitherCatchCancel :: MonadIO m => Async a -> Async b -> m (Either (Either SomeException a) (Either SomeException b)) #

Lifted waitEitherCatchCancel.

Since: unliftio-0.1.0.0

waitEither_ :: MonadIO m => Async a -> Async b -> m () #

Lifted waitEither_.

Since: unliftio-0.1.0.0

waitBoth :: MonadIO m => Async a -> Async b -> m (a, b) #

Lifted waitBoth.

Since: unliftio-0.1.0.0

link :: MonadIO m => Async a -> m () #

Lifted link.

Since: unliftio-0.1.0.0

link2 :: MonadIO m => Async a -> Async b -> m () #

Lifted link2.

Since: unliftio-0.1.0.0

race :: MonadUnliftIO m => m a -> m b -> m (Either a b) #

Unlifted race.

Since: unliftio-0.1.0.0

race_ :: MonadUnliftIO m => m a -> m b -> m () #

Unlifted race_.

Since: unliftio-0.1.0.0

concurrently :: MonadUnliftIO m => m a -> m b -> m (a, b) #

Unlifted concurrently.

Since: unliftio-0.1.0.0

concurrently_ :: MonadUnliftIO m => m a -> m b -> m () #

Unlifted concurrently_.

Since: unliftio-0.1.0.0

forConcurrently :: (MonadUnliftIO m, Traversable t) => t a -> (a -> m b) -> m (t b) #

Similar to mapConcurrently but with arguments flipped

Since: unliftio-0.1.0.0

forConcurrently_ :: (MonadUnliftIO m, Foldable f) => f a -> (a -> m b) -> m () #

Similar to mapConcurrently_ but with arguments flipped

Since: unliftio-0.1.0.0

replicateConcurrently :: MonadUnliftIO f => Int -> f a -> f [a] #

Unlifted replicateConcurrently.

Since: unliftio-0.1.0.0

replicateConcurrently_ :: (Applicative m, MonadUnliftIO m) => Int -> m a -> m () #

Unlifted replicateConcurrently_.

Since: unliftio-0.1.0.0

mapConcurrently :: (MonadUnliftIO m, Traversable t) => (a -> m b) -> t a -> m (t b) #

Executes a Traversable container of items concurrently, it uses the Flat type internally.

Since: unliftio-0.1.0.0

mapConcurrently_ :: (MonadUnliftIO m, Foldable f) => (a -> m b) -> f a -> m () #

Executes a Traversable container of items concurrently, it uses the Flat type internally. This function ignores the results.

Since: unliftio-0.1.0.0

conc :: m a -> Conc m a #

Construct a value of type Conc from an action. Compose these values using the typeclass instances (most commonly Applicative and Alternative) and then run with runConc.

Since: unliftio-0.2.9.0

runConc :: MonadUnliftIO m => Conc m a -> m a #

Run a Conc value on multiple threads.

Since: unliftio-0.2.9.0

pooledMapConcurrentlyN #

Arguments

:: (MonadUnliftIO m, Traversable t) 
=> Int

Max. number of threads. Should not be less than 1.

-> (a -> m b) 
-> t a 
-> m (t b) 

Like mapConcurrently from async, but instead of one thread per element, it does pooling from a set of threads. This is useful in scenarios where resource consumption is bounded and for use cases where too many concurrent tasks aren't allowed.

Example usage

Expand
import Say

action :: Int -> IO Int
action n = do
  tid <- myThreadId
  sayString $ show tid
  threadDelay (2 * 10^6) -- 2 seconds
  return n

main :: IO ()
main = do
  yx <- pooledMapConcurrentlyN 5 (\x -> action x) [1..5]
  print yx

On executing you can see that five threads have been spawned:

$ ./pool
ThreadId 36
ThreadId 38
ThreadId 40
ThreadId 42
ThreadId 44
[1,2,3,4,5]

Let's modify the above program such that there are less threads than the number of items in the list:

import Say

action :: Int -> IO Int
action n = do
  tid <- myThreadId
  sayString $ show tid
  threadDelay (2 * 10^6) -- 2 seconds
  return n

main :: IO ()
main = do
  yx <- pooledMapConcurrentlyN 3 (\x -> action x) [1..5]
  print yx

On executing you can see that only three threads are active totally:

$ ./pool
ThreadId 35
ThreadId 37
ThreadId 39
ThreadId 35
ThreadId 39
[1,2,3,4,5]

Since: unliftio-0.2.10

pooledMapConcurrently :: (MonadUnliftIO m, Traversable t) => (a -> m b) -> t a -> m (t b) #

Similar to pooledMapConcurrentlyN but with number of threads set from getNumCapabilities. Usually this is useful for CPU bound tasks.

Since: unliftio-0.2.10

pooledForConcurrentlyN #

Arguments

:: (MonadUnliftIO m, Traversable t) 
=> Int

Max. number of threads. Should not be less than 1.

-> t a 
-> (a -> m b) 
-> m (t b) 

Similar to pooledMapConcurrentlyN but with flipped arguments.

Since: unliftio-0.2.10

pooledForConcurrently :: (MonadUnliftIO m, Traversable t) => t a -> (a -> m b) -> m (t b) #

Similar to pooledForConcurrentlyN but with number of threads set from getNumCapabilities. Usually this is useful for CPU bound tasks.

Since: unliftio-0.2.10

pooledMapConcurrentlyN_ #

Arguments

:: (MonadUnliftIO m, Foldable f) 
=> Int

Max. number of threads. Should not be less than 1.

-> (a -> m b) 
-> f a 
-> m () 

Like pooledMapConcurrentlyN but with the return value discarded.

Since: unliftio-0.2.10

pooledMapConcurrently_ :: (MonadUnliftIO m, Foldable f) => (a -> m b) -> f a -> m () #

Like pooledMapConcurrently but with the return value discarded.

Since: unliftio-0.2.10

pooledForConcurrently_ :: (MonadUnliftIO m, Foldable f) => f a -> (a -> m b) -> m () #

Like pooledMapConcurrently_ but with flipped arguments.

Since: unliftio-0.2.10

pooledForConcurrentlyN_ #

Arguments

:: (MonadUnliftIO m, Foldable t) 
=> Int

Max. number of threads. Should not be less than 1.

-> t a 
-> (a -> m b) 
-> m () 

Like pooledMapConcurrentlyN_ but with flipped arguments.

Since: unliftio-0.2.10

pooledReplicateConcurrentlyN #

Arguments

:: MonadUnliftIO m 
=> Int

Max. number of threads. Should not be less than 1.

-> Int

Number of times to perform the action.

-> m a 
-> m [a] 

Pooled version of replicateConcurrently. Performs the action in the pooled threads.

Since: unliftio-0.2.10

pooledReplicateConcurrently #

Arguments

:: MonadUnliftIO m 
=> Int

Number of times to perform the action.

-> m a 
-> m [a] 

Similar to pooledReplicateConcurrentlyN but with number of threads set from getNumCapabilities. Usually this is useful for CPU bound tasks.

Since: unliftio-0.2.10

pooledReplicateConcurrentlyN_ #

Arguments

:: MonadUnliftIO m 
=> Int

Max. number of threads. Should not be less than 1.

-> Int

Number of times to perform the action.

-> m a 
-> m () 

Pooled version of replicateConcurrently_. Performs the action in the pooled threads.

Since: unliftio-0.2.10

pooledReplicateConcurrently_ #

Arguments

:: MonadUnliftIO m 
=> Int

Number of times to perform the action.

-> m a 
-> m () 

Similar to pooledReplicateConcurrently_ but with number of threads set from getNumCapabilities. Usually this is useful for CPU bound tasks.

Since: unliftio-0.2.10

newEmptyMVar :: MonadIO m => m (MVar a) #

Lifted newEmptyMVar.

Since: unliftio-0.1.0.0

newMVar :: MonadIO m => a -> m (MVar a) #

Lifted newMVar.

Since: unliftio-0.1.0.0

takeMVar :: MonadIO m => MVar a -> m a #

Lifted takeMVar.

Since: unliftio-0.1.0.0

putMVar :: MonadIO m => MVar a -> a -> m () #

Lifted putMVar.

Since: unliftio-0.1.0.0

readMVar :: MonadIO m => MVar a -> m a #

Lifted readMVar.

Since: unliftio-0.1.0.0

swapMVar :: MonadIO m => MVar a -> a -> m a #

Lifted swapMVar.

Since: unliftio-0.1.0.0

tryTakeMVar :: MonadIO m => MVar a -> m (Maybe a) #

Lifted tryTakeMVar.

Since: unliftio-0.1.0.0

tryPutMVar :: MonadIO m => MVar a -> a -> m Bool #

Lifted tryPutMVar.

Since: unliftio-0.1.0.0

isEmptyMVar :: MonadIO m => MVar a -> m Bool #

Lifted isEmptyMVar.

Since: unliftio-0.1.0.0

tryReadMVar :: MonadIO m => MVar a -> m (Maybe a) #

Lifted tryReadMVar.

Since: unliftio-0.1.0.0

withMVar :: MonadUnliftIO m => MVar a -> (a -> m b) -> m b #

Unlifted withMVar.

Since: unliftio-0.1.0.0

withMVarMasked :: MonadUnliftIO m => MVar a -> (a -> m b) -> m b #

Unlifted withMVarMasked.

Since: unliftio-0.1.0.0

modifyMVar_ :: MonadUnliftIO m => MVar a -> (a -> m a) -> m () #

Unlifted modifyMVar_.

Since: unliftio-0.1.0.0

modifyMVar :: MonadUnliftIO m => MVar a -> (a -> m (a, b)) -> m b #

Unlifted modifyMVar.

Since: unliftio-0.1.0.0

modifyMVarMasked_ :: MonadUnliftIO m => MVar a -> (a -> m a) -> m () #

Unlifted modifyMVarMasked_.

Since: unliftio-0.1.0.0

modifyMVarMasked :: MonadUnliftIO m => MVar a -> (a -> m (a, b)) -> m b #

Unlifted modifyMVarMasked.

Since: unliftio-0.1.0.0

mkWeakMVar :: MonadUnliftIO m => MVar a -> m () -> m (Weak (MVar a)) #

Unlifted mkWeakMVar.

Since: unliftio-0.1.0.0

data Memoized a #

A "run once" value, with results saved. Extract the value with runMemoized. For single-threaded usage, you can use memoizeRef to create a value. If you need guarantees that only one thread will run the action at a time, use memoizeMVar.

Note that this type provides a Show instance for convenience, but not useful information can be provided.

Since: unliftio-0.2.8.0

Instances

Instances details
Applicative Memoized 
Instance details

Defined in UnliftIO.Memoize

Methods

pure :: a -> Memoized a #

(<*>) :: Memoized (a -> b) -> Memoized a -> Memoized b #

liftA2 :: (a -> b -> c) -> Memoized a -> Memoized b -> Memoized c #

(*>) :: Memoized a -> Memoized b -> Memoized b #

(<*) :: Memoized a -> Memoized b -> Memoized a #

Functor Memoized 
Instance details

Defined in UnliftIO.Memoize

Methods

fmap :: (a -> b) -> Memoized a -> Memoized b #

(<$) :: a -> Memoized b -> Memoized a #

Monad Memoized 
Instance details

Defined in UnliftIO.Memoize

Methods

(>>=) :: Memoized a -> (a -> Memoized b) -> Memoized b #

(>>) :: Memoized a -> Memoized b -> Memoized b #

return :: a -> Memoized a #

Show (Memoized a) 
Instance details

Defined in UnliftIO.Memoize

Methods

showsPrec :: Int -> Memoized a -> ShowS #

show :: Memoized a -> String #

showList :: [Memoized a] -> ShowS #

runMemoized :: MonadIO m => Memoized a -> m a #

Extract a value from a Memoized, running an action if no cached value is available.

Since: unliftio-0.2.8.0

memoizeRef :: MonadUnliftIO m => m a -> m (Memoized a) #

Create a new Memoized value using an IORef under the surface. Note that the action may be run in multiple threads simultaneously, so this may not be thread safe (depending on the underlying action). Consider using memoizeMVar.

Since: unliftio-0.2.8.0

memoizeMVar :: MonadUnliftIO m => m a -> m (Memoized a) #

Same as memoizeRef, but uses an MVar to ensure that an action is only run once, even in a multithreaded application.

Since: unliftio-0.2.8.0

newQSem :: MonadIO m => Int -> m QSem #

Lifted newQSem.

Since: unliftio-0.2.14

waitQSem :: MonadIO m => QSem -> m () #

Lifted waitQSem.

Since: unliftio-0.2.14

signalQSem :: MonadIO m => QSem -> m () #

Lifted signalQSem.

Since: unliftio-0.2.14

withQSem :: MonadUnliftIO m => QSem -> m a -> m a #

withQSem is an exception-safe wrapper for performing the provided operation while holding a unit of value from the semaphore. It ensures the semaphore cannot be leaked if there are exceptions.

Since: unliftio-0.2.14

newQSemN :: MonadIO m => Int -> m QSemN #

Lifted newQSemN.

Since: unliftio-0.2.14

waitQSemN :: MonadIO m => QSemN -> Int -> m () #

Lifted waitQSemN.

Since: unliftio-0.2.14

signalQSemN :: MonadIO m => QSemN -> Int -> m () #

Lifted signalQSemN.

Since: unliftio-0.2.14

withQSemN :: MonadUnliftIO m => QSemN -> Int -> m a -> m a #

withQSemN is an exception-safe wrapper for performing the provided operation while holding N unit of value from the semaphore. It ensures the semaphore cannot be leaked if there are exceptions.

Since: unliftio-0.2.14

atomically :: MonadIO m => STM a -> m a #

Lifted version of atomically

Since: unliftio-0.2.1.0

retrySTM :: STM a #

Renamed retry for unqualified export

Since: unliftio-0.2.1.0

checkSTM :: Bool -> STM () #

Renamed check for unqualified export

Since: unliftio-0.2.1.0

newTVarIO :: MonadIO m => a -> m (TVar a) #

Lifted version of newTVarIO

Since: unliftio-0.2.1.0

readTVarIO :: MonadIO m => TVar a -> m a #

Lifted version of readTVarIO

Since: unliftio-0.2.1.0

registerDelay :: MonadIO m => Int -> m (TVar Bool) #

Lifted version of registerDelay

Since: unliftio-0.2.1.0

mkWeakTVar :: MonadUnliftIO m => TVar a -> m () -> m (Weak (TVar a)) #

Lifted version of mkWeakTVar

Since: unliftio-0.2.1.0

newTMVarIO :: MonadIO m => a -> m (TMVar a) #

Lifted version of newTMVarIO

Since: unliftio-0.2.1.0

newEmptyTMVarIO :: MonadIO m => m (TMVar a) #

Lifted version of newEmptyTMVarIO

Since: unliftio-0.2.1.0

mkWeakTMVar :: MonadUnliftIO m => TMVar a -> m () -> m (Weak (TMVar a)) #

Lifted version of mkWeakTMVar

Since: unliftio-0.2.1.0

newTChanIO :: MonadIO m => m (TChan a) #

Lifted version of newTChanIO

Since: unliftio-0.2.1.0

newBroadcastTChanIO :: MonadIO m => m (TChan a) #

Lifted version of newBroadcastTChanIO

Since: unliftio-0.2.1.0

newTQueueIO :: MonadIO m => m (TQueue a) #

Lifted version of newTQueueIO

Since: unliftio-0.2.1.0

newTBQueueIO :: MonadIO m => Natural -> m (TBQueue a) #

Lifted version of newTBQueueIO

Since: unliftio-0.2.1.0

withSystemTempFile #

Arguments

:: MonadUnliftIO m 
=> String

File name template. See openTempFile.

-> (FilePath -> Handle -> m a)

Callback that can use the file

-> m a 

Create and use a temporary file in the system standard temporary directory.

Behaves exactly the same as withTempFile, except that the parent temporary directory will be that returned by getCanonicalTemporaryDirectory.

Since: unliftio-0.1.0.0

withSystemTempDirectory #

Arguments

:: MonadUnliftIO m 
=> String

Directory name template. See openTempFile.

-> (FilePath -> m a)

Callback that can use the directory.

-> m a 

Create and use a temporary directory in the system standard temporary directory.

Behaves exactly the same as withTempDirectory, except that the parent temporary directory will be that returned by getCanonicalTemporaryDirectory.

Since: unliftio-0.1.0.0

withTempFile #

Arguments

:: MonadUnliftIO m 
=> FilePath

Temp dir to create the file in.

-> String

File name template. See openTempFile.

-> (FilePath -> Handle -> m a)

Callback that can use the file.

-> m a 

Use a temporary filename that doesn't already exist.

Creates a new temporary file inside the given directory, making use of the template. The temp file is deleted after use. For example:

withTempFile "src" "sdist." $ \tmpFile hFile -> do ...

The tmpFile will be file in the given directory, e.g. src/sdist.342.

Since: unliftio-0.1.0.0

withTempDirectory #

Arguments

:: MonadUnliftIO m 
=> FilePath

Temp directory to create the directory in.

-> String

Directory name template. See openTempFile.

-> (FilePath -> m a)

Callback that can use the directory.

-> m a 

Create and use a temporary directory.

Creates a new temporary directory inside the given directory, making use of the template. The temp directory is deleted after use. For example:

withTempDirectory "src" "sdist." $ \tmpDir -> do ...

The tmpDir will be a new subdirectory of the given directory, e.g. src/sdist.342.

Since: unliftio-0.1.0.0

timeout :: MonadUnliftIO m => Int -> m a -> m (Maybe a) #

Unlifted timeout.

Since: unliftio-0.1.0.0

liftIOOp :: MonadUnliftIO m => (IO a -> IO b) -> m a -> m b #

A helper function for lifting IO a -> IO b functions into any MonadUnliftIO.

Example

Expand
liftedTry :: (Exception e, MonadUnliftIO m) => m a -> m (Either e a)
liftedTry m = liftIOOp Control.Exception.try m

Since: unliftio-core-0.2.1.0

wrappedWithRunInIO #

Arguments

:: MonadUnliftIO n 
=> (n b -> m b)

The wrapper, for instance IdentityT.

-> (forall a. m a -> n a)

The inverse, for instance runIdentityT.

-> ((forall a. m a -> IO a) -> IO b)

The actual function to invoke withRunInIO with.

-> m b 

A helper function for implementing MonadUnliftIO instances. Useful for the common case where you want to simply delegate to the underlying transformer.

Note: You can derive MonadUnliftIO for newtypes without this helper function in unliftio-core 0.2.0.0 and later.

Example

Expand
newtype AppT m a = AppT { unAppT :: ReaderT Int (ResourceT m) a }
  deriving (Functor, Applicative, Monad, MonadIO)

-- Same as `deriving newtype (MonadUnliftIO)`
instance MonadUnliftIO m => MonadUnliftIO (AppT m) where
  withRunInIO = wrappedWithRunInIO AppT unAppT

Since: unliftio-core-0.1.2.0

toIO :: MonadUnliftIO m => m a -> m (IO a) #

Convert an action in m to an action in IO.

Since: unliftio-core-0.1.0.0

withUnliftIO :: MonadUnliftIO m => (UnliftIO m -> IO a) -> m a #

Convenience function for capturing the monadic context and running an IO action. The UnliftIO newtype wrapper is rarely needed, so prefer withRunInIO to this function.

Since: unliftio-core-0.1.0.0

askRunInIO :: MonadUnliftIO m => m (m a -> IO a) #

Same as askUnliftIO, but returns a monomorphic function instead of a polymorphic newtype wrapper. If you only need to apply the transformation on one concrete type, this function can be more convenient.

Since: unliftio-core-0.1.0.0

askUnliftIO :: MonadUnliftIO m => m (UnliftIO m) #

Capture the current monadic context, providing the ability to run monadic actions in IO.

See UnliftIO for an explanation of why we need a helper datatype here.

Prior to version 0.2.0.0 of this library, this was a method in the MonadUnliftIO type class. It was moved out due to https://github.com/fpco/unliftio/issues/55.

Since: unliftio-core-0.1.0.0

newtype UnliftIO (m :: Type -> Type) #

The ability to run any monadic action m a as IO a.

This is more precisely a natural transformation. We need to new datatype (instead of simply using a forall) due to lack of support in GHC for impredicative types.

Since: unliftio-core-0.1.0.0

Constructors

UnliftIO 

Fields

flushTBQueue :: TBQueue a -> STM [a] #

Efficiently read the entire contents of a TBQueue into a list. This function never retries.

Since: stm-2.4.5

isEmptyTBQueue :: TBQueue a -> STM Bool #

Returns True if the supplied TBQueue is empty.

isFullTBQueue :: TBQueue a -> STM Bool #

Returns True if the supplied TBQueue is full.

Since: stm-2.4.3

lengthTBQueue :: TBQueue a -> STM Natural #

Return the length of a TBQueue.

Since: stm-2.5.0.0

newTBQueue #

Arguments

:: Natural

maximum number of elements the queue can hold

-> STM (TBQueue a) 

Builds and returns a new instance of TBQueue.

peekTBQueue :: TBQueue a -> STM a #

Get the next value from the TBQueue without removing it, retrying if the channel is empty.

readTBQueue :: TBQueue a -> STM a #

Read the next value from the TBQueue.

tryPeekTBQueue :: TBQueue a -> STM (Maybe a) #

A version of peekTBQueue which does not retry. Instead it returns Nothing if no value is available.

tryReadTBQueue :: TBQueue a -> STM (Maybe a) #

A version of readTBQueue which does not retry. Instead it returns Nothing if no value is available.

unGetTBQueue :: TBQueue a -> a -> STM () #

Put a data item back onto a channel, where it will be the next item read. Blocks if the queue is full.

writeTBQueue :: TBQueue a -> a -> STM () #

Write a value to a TBQueue; blocks if the queue is full.

data TBQueue a #

TBQueue is an abstract type representing a bounded FIFO channel.

Since: stm-2.4

Instances

Instances details
Eq (TBQueue a) 
Instance details

Defined in Control.Concurrent.STM.TBQueue

Methods

(==) :: TBQueue a -> TBQueue a -> Bool #

(/=) :: TBQueue a -> TBQueue a -> Bool #

cloneTChan :: TChan a -> STM (TChan a) #

Clone a TChan: similar to dupTChan, but the cloned channel starts with the same content available as the original channel.

Since: stm-2.4

dupTChan :: TChan a -> STM (TChan a) #

Duplicate a TChan: the duplicate channel begins empty, but data written to either channel from then on will be available from both. Hence this creates a kind of broadcast channel, where data written by anyone is seen by everyone else.

isEmptyTChan :: TChan a -> STM Bool #

Returns True if the supplied TChan is empty.

newBroadcastTChan :: STM (TChan a) #

Create a write-only TChan. More precisely, readTChan will retry even after items have been written to the channel. The only way to read a broadcast channel is to duplicate it with dupTChan.

Consider a server that broadcasts messages to clients:

serve :: TChan Message -> Client -> IO loop
serve broadcastChan client = do
    myChan <- dupTChan broadcastChan
    forever $ do
        message <- readTChan myChan
        send client message

The problem with using newTChan to create the broadcast channel is that if it is only written to and never read, items will pile up in memory. By using newBroadcastTChan to create the broadcast channel, items can be garbage collected after clients have seen them.

Since: stm-2.4

newTChan :: STM (TChan a) #

Build and return a new instance of TChan

peekTChan :: TChan a -> STM a #

Get the next value from the TChan without removing it, retrying if the channel is empty.

Since: stm-2.3

readTChan :: TChan a -> STM a #

Read the next value from the TChan.

tryPeekTChan :: TChan a -> STM (Maybe a) #

A version of peekTChan which does not retry. Instead it returns Nothing if no value is available.

Since: stm-2.3

tryReadTChan :: TChan a -> STM (Maybe a) #

A version of readTChan which does not retry. Instead it returns Nothing if no value is available.

Since: stm-2.3

unGetTChan :: TChan a -> a -> STM () #

Put a data item back onto a channel, where it will be the next item read.

writeTChan :: TChan a -> a -> STM () #

Write a value to a TChan.

data TChan a #

TChan is an abstract type representing an unbounded FIFO channel.

Instances

Instances details
Eq (TChan a) 
Instance details

Defined in Control.Concurrent.STM.TChan

Methods

(==) :: TChan a -> TChan a -> Bool #

(/=) :: TChan a -> TChan a -> Bool #

isEmptyTMVar :: TMVar a -> STM Bool #

Check whether a given TMVar is empty.

newEmptyTMVar :: STM (TMVar a) #

Create a TMVar which is initially empty.

newTMVar :: a -> STM (TMVar a) #

Create a TMVar which contains the supplied value.

putTMVar :: TMVar a -> a -> STM () #

Put a value into a TMVar. If the TMVar is currently full, putTMVar will retry.

readTMVar :: TMVar a -> STM a #

This is a combination of takeTMVar and putTMVar; ie. it takes the value from the TMVar, puts it back, and also returns it.

swapTMVar :: TMVar a -> a -> STM a #

Swap the contents of a TMVar for a new value.

takeTMVar :: TMVar a -> STM a #

Return the contents of the TMVar. If the TMVar is currently empty, the transaction will retry. After a takeTMVar, the TMVar is left empty.

tryPutTMVar :: TMVar a -> a -> STM Bool #

A version of putTMVar that does not retry. The tryPutTMVar function attempts to put the value a into the TMVar, returning True if it was successful, or False otherwise.

tryReadTMVar :: TMVar a -> STM (Maybe a) #

A version of readTMVar which does not retry. Instead it returns Nothing if no value is available.

Since: stm-2.3

tryTakeTMVar :: TMVar a -> STM (Maybe a) #

A version of takeTMVar that does not retry. The tryTakeTMVar function returns Nothing if the TMVar was empty, or Just a if the TMVar was full with contents a. After tryTakeTMVar, the TMVar is left empty.

data TMVar a #

A TMVar is a synchronising variable, used for communication between concurrent threads. It can be thought of as a box, which may be empty or full.

Instances

Instances details
Eq (TMVar a) 
Instance details

Defined in Control.Concurrent.STM.TMVar

Methods

(==) :: TMVar a -> TMVar a -> Bool #

(/=) :: TMVar a -> TMVar a -> Bool #

isEmptyTQueue :: TQueue a -> STM Bool #

Returns True if the supplied TQueue is empty.

newTQueue :: STM (TQueue a) #

Build and returns a new instance of TQueue

peekTQueue :: TQueue a -> STM a #

Get the next value from the TQueue without removing it, retrying if the channel is empty.

readTQueue :: TQueue a -> STM a #

Read the next value from the TQueue.

tryPeekTQueue :: TQueue a -> STM (Maybe a) #

A version of peekTQueue which does not retry. Instead it returns Nothing if no value is available.

tryReadTQueue :: TQueue a -> STM (Maybe a) #

A version of readTQueue which does not retry. Instead it returns Nothing if no value is available.

unGetTQueue :: TQueue a -> a -> STM () #

Put a data item back onto a channel, where it will be the next item read.

writeTQueue :: TQueue a -> a -> STM () #

Write a value to a TQueue.

data TQueue a #

TQueue is an abstract type representing an unbounded FIFO channel.

Since: stm-2.4

Instances

Instances details
Eq (TQueue a) 
Instance details

Defined in Control.Concurrent.STM.TQueue

Methods

(==) :: TQueue a -> TQueue a -> Bool #

(/=) :: TQueue a -> TQueue a -> Bool #

modifyTVar :: TVar a -> (a -> a) -> STM () #

Mutate the contents of a TVar. N.B., this version is non-strict.

Since: stm-2.3

modifyTVar' :: TVar a -> (a -> a) -> STM () #

Strict version of modifyTVar.

Since: stm-2.3

stateTVar :: TVar s -> (s -> (a, s)) -> STM a #

Like modifyTVar' but the function is a simple state transition that can return a side value which is passed on as the result of the STM.

Since: stm-2.5.0

swapTVar :: TVar a -> a -> STM a #

Swap the contents of a TVar for a new value.

Since: stm-2.3

data AsyncExceptionWrapper #

Wrap up a synchronous exception to be treated as an asynchronous exception

This is intended to be created via toAsyncException

Since: safe-exceptions-0.1.0.0

Constructors

Exception e => AsyncExceptionWrapper e 

data SyncExceptionWrapper #

Wrap up an asynchronous exception to be treated as a synchronous exception

This is intended to be created via toSyncException

Since: safe-exceptions-0.1.0.0

Constructors

Exception e => SyncExceptionWrapper e 

withCurrentDirectory :: MonadUnliftIO m => FilePath -> m a -> m a #

Unlifted withCurrentDirectory.

Since: unliftio-0.2.6.0

traceDisplayStack :: Display a => a -> b -> b #

Since: rio-0.1.0.0

traceDisplayMarkerIO :: (Display a, MonadIO m) => a -> m () #

Since: rio-0.1.0.0

traceDisplayMarker :: Display a => a -> b -> b #

Since: rio-0.1.0.0

traceDisplayEventIO :: (Display a, MonadIO m) => a -> m () #

Since: rio-0.1.0.0

traceDisplayEvent :: Display a => a -> b -> b #

Since: rio-0.1.0.0

traceDisplayM :: (Display a, Applicative f) => a -> f () #

Since: rio-0.1.0.0

traceDisplayIO :: (Display a, MonadIO m) => a -> m () #

Since: rio-0.1.0.0

traceDisplayId :: Display a => a -> a #

Since: rio-0.1.0.0

traceDisplay :: Display a => a -> b -> b #

Since: rio-0.1.0.0

traceShowStack :: Show a => a -> b -> b #

Since: rio-0.1.0.0

traceShowMarkerIO :: (Show a, MonadIO m) => a -> m () #

Since: rio-0.1.0.0

traceShowMarker :: Show a => a -> b -> b #

Since: rio-0.1.0.0

traceShowEventIO :: (Show a, MonadIO m) => a -> m () #

Since: rio-0.1.0.0

traceShowEvent :: Show a => a -> b -> b #

Since: rio-0.1.0.0

traceShowM :: (Show a, Applicative f) => a -> f () #

Since: rio-0.1.0.0

traceShowIO :: (Show a, MonadIO m) => a -> m () #

Since: rio-0.1.0.0

traceShowId :: Show a => a -> a #

Since: rio-0.1.0.0

traceShow :: Show a => a -> b -> b #

Since: rio-0.1.0.0

traceStack :: Text -> a -> a #

Since: rio-0.1.0.0

traceMarkerIO :: MonadIO m => Text -> m () #

Since: rio-0.1.0.0

traceMarker :: Text -> a -> a #

Since: rio-0.1.0.0

traceEventIO :: MonadIO m => Text -> m () #

Since: rio-0.1.0.0

traceEvent :: Text -> a -> a #

Since: rio-0.1.0.0

traceM :: Applicative f => Text -> f () #

Since: rio-0.1.0.0

traceIO :: MonadIO m => Text -> m () #

Since: rio-0.1.0.0

traceId :: Text -> Text #

Since: rio-0.1.0.0

trace :: Text -> a -> a #

Since: rio-0.1.0.0

runSimpleApp :: MonadIO m => RIO SimpleApp a -> m a #

Run with a default configured SimpleApp, consisting of:

  • Logging to stderr
  • If the RIO_VERBOSE environment variable is set, turns on verbose logging
  • Default process context

Since: rio-0.1.3.0

mkSimpleApp :: MonadIO m => LogFunc -> Maybe ProcessContext -> m SimpleApp #

Constructor for SimpleApp. In case when ProcessContext is not supplied mkDefaultProcessContext will be used to create it.

Since: rio-0.1.14.0

data SimpleApp #

A simple, non-customizable environment type for RIO, which provides common functionality. If it's insufficient for your needs, define your own, custom App data type.

Since: rio-0.1.3.0

Instances

Instances details
HasLogFunc SimpleApp 
Instance details

Defined in RIO.Prelude.Simple

HasProcessContext SimpleApp 
Instance details

Defined in RIO.Prelude.Simple

newUnboxedSomeRef :: (MonadIO m, Unbox a) => a -> m (SomeRef a) #

create a new unboxed SomeRef

Since: rio-0.1.4.0

newSomeRef :: MonadIO m => a -> m (SomeRef a) #

create a new boxed SomeRef

Since: rio-0.1.4.0

modifySomeRef :: MonadIO m => SomeRef a -> (a -> a) -> m () #

Modify a SomeRef This function is subject to change due to the lack of atomic operations

Since: rio-0.1.4.0

writeSomeRef :: MonadIO m => SomeRef a -> a -> m () #

Write to a SomeRef

Since: rio-0.1.4.0

readSomeRef :: MonadIO m => SomeRef a -> m a #

Read from a SomeRef

Since: rio-0.1.4.0

mapRIO :: (outer -> inner) -> RIO inner a -> RIO outer a #

Lift one RIO env to another.

Since: rio-0.1.13.0

liftRIO :: (MonadIO m, MonadReader env m) => RIO env a -> m a #

Abstract RIO to an arbitrary MonadReader instance, which can handle IO.

Since: rio-0.0.1.0

runRIO :: MonadIO m => env -> RIO env a -> m a #

Using the environment run in IO the action that requires that environment.

Since: rio-0.0.1.0

newtype RIO env a #

The Reader+IO monad. This is different from a ReaderT because:

  • It's not a transformer, it hardcodes IO for simpler usage and error messages.
  • Instances of typeclasses like MonadLogger are implemented using classes defined on the environment, instead of using an underlying monad.

Constructors

RIO 

Fields

Instances

Instances details
MonadReader env (RIO env) 
Instance details

Defined in RIO.Prelude.RIO

Methods

ask :: RIO env env #

local :: (env -> env) -> RIO env a -> RIO env a #

reader :: (env -> a) -> RIO env a #

HasStateRef s env => MonadState s (RIO env) 
Instance details

Defined in RIO.Prelude.RIO

Methods

get :: RIO env s #

put :: s -> RIO env () #

state :: (s -> (a, s)) -> RIO env a #

(Monoid w, HasWriteRef w env) => MonadWriter w (RIO env) 
Instance details

Defined in RIO.Prelude.RIO

Methods

writer :: (a, w) -> RIO env a #

tell :: w -> RIO env () #

listen :: RIO env a -> RIO env (a, w) #

pass :: RIO env (a, w -> w) -> RIO env a #

MonadIO (RIO env) 
Instance details

Defined in RIO.Prelude.RIO

Methods

liftIO :: IO a -> RIO env a #

Applicative (RIO env) 
Instance details

Defined in RIO.Prelude.RIO

Methods

pure :: a -> RIO env a #

(<*>) :: RIO env (a -> b) -> RIO env a -> RIO env b #

liftA2 :: (a -> b -> c) -> RIO env a -> RIO env b -> RIO env c #

(*>) :: RIO env a -> RIO env b -> RIO env b #

(<*) :: RIO env a -> RIO env b -> RIO env a #

Functor (RIO env) 
Instance details

Defined in RIO.Prelude.RIO

Methods

fmap :: (a -> b) -> RIO env a -> RIO env b #

(<$) :: a -> RIO env b -> RIO env a #

Monad (RIO env) 
Instance details

Defined in RIO.Prelude.RIO

Methods

(>>=) :: RIO env a -> (a -> RIO env b) -> RIO env b #

(>>) :: RIO env a -> RIO env b -> RIO env b #

return :: a -> RIO env a #

MonadThrow (RIO env) 
Instance details

Defined in RIO.Prelude.RIO

Methods

throwM :: Exception e => e -> RIO env a #

PrimMonad (RIO env) 
Instance details

Defined in RIO.Prelude.RIO

Associated Types

type PrimState (RIO env) #

Methods

primitive :: (State# (PrimState (RIO env)) -> (# State# (PrimState (RIO env)), a #)) -> RIO env a #

MonadUnliftIO (RIO env) 
Instance details

Defined in RIO.Prelude.RIO

Methods

withRunInIO :: ((forall a. RIO env a -> IO a) -> IO b) -> RIO env b #

Monoid a => Monoid (RIO env a) 
Instance details

Defined in RIO.Prelude.RIO

Methods

mempty :: RIO env a #

mappend :: RIO env a -> RIO env a -> RIO env a #

mconcat :: [RIO env a] -> RIO env a #

Semigroup a => Semigroup (RIO env a) 
Instance details

Defined in RIO.Prelude.RIO

Methods

(<>) :: RIO env a -> RIO env a -> RIO env a #

sconcat :: NonEmpty (RIO env a) -> RIO env a #

stimes :: Integral b => b -> RIO env a -> RIO env a #

type PrimState (RIO env) 
Instance details

Defined in RIO.Prelude.RIO

type PrimState (RIO env) = PrimState IO

data SomeRef a #

Abstraction over how to read from and write to a mutable reference

Since: rio-0.1.4.0

Instances

Instances details
HasStateRef a (SomeRef a)

Identity state reference where the SomeRef is the env

Since: rio-0.1.4.0

Instance details

Defined in RIO.Prelude.RIO

Methods

stateRefL :: Lens' (SomeRef a) (SomeRef a) #

HasWriteRef a (SomeRef a)

Identity write reference where the SomeRef is the env

Since: rio-0.1.4.0

Instance details

Defined in RIO.Prelude.RIO

Methods

writeRefL :: Lens' (SomeRef a) (SomeRef a) #

class HasStateRef s env | env -> s where #

Environment values with stateful capabilities to SomeRef

Since: rio-0.1.4.0

Methods

stateRefL :: Lens' env (SomeRef s) #

Instances

Instances details
HasStateRef a (SomeRef a)

Identity state reference where the SomeRef is the env

Since: rio-0.1.4.0

Instance details

Defined in RIO.Prelude.RIO

Methods

stateRefL :: Lens' (SomeRef a) (SomeRef a) #

class HasWriteRef w env | env -> w where #

Environment values with writing capabilities to SomeRef

Since: rio-0.1.4.0

Methods

writeRefL :: Lens' env (SomeRef w) #

Instances

Instances details
HasWriteRef a (SomeRef a)

Identity write reference where the SomeRef is the env

Since: rio-0.1.4.0

Instance details

Defined in RIO.Prelude.RIO

Methods

writeRefL :: Lens' (SomeRef a) (SomeRef a) #

modifyURef :: (PrimMonad m, Unbox a) => URef (PrimState m) a -> (a -> a) -> m () #

Modify a value in a URef. Note that this action is strict, and will force evaluation of the result value.

Since: rio-0.0.2.0

writeURef :: (PrimMonad m, Unbox a) => URef (PrimState m) a -> a -> m () #

Write a value into a URef. Note that this action is strict, and will force evalution of the value.

Since: rio-0.0.2.0

readURef :: (PrimMonad m, Unbox a) => URef (PrimState m) a -> m a #

Read the value in a URef

Since: rio-0.0.2.0

newURef :: (PrimMonad m, Unbox a) => a -> m (URef (PrimState m) a) #

Create a new URef

Since: rio-0.0.2.0

data URef s a #

An unboxed reference. This works like an IORef, but the data is stored in a bytearray instead of a heap object, avoiding significant allocation overhead in some cases. For a concrete example, see this Stack Overflow question: https://stackoverflow.com/questions/27261813/why-is-my-little-stref-int-require-allocating-gigabytes.

The first parameter is the state token type, the same as would be used for the ST monad. If you're using an IO-based monad, you can use the convenience IOURef type synonym instead.

Since: rio-0.0.2.0

type IOURef = URef (PrimState IO) #

Helpful type synonym for using a URef from an IO-based stack.

Since: rio-0.0.2.0

freezeDeque :: (Vector v a, PrimMonad m) => Deque (Mutable v) (PrimState m) a -> m (v a) #

Yield an immutable copy of the underlying mutable vector. The difference from dequeToVector is that the the copy will be performed with a more efficient memcpy, rather than element by element. The downside is that the resulting vector type must be the one that corresponds to the mutable one that is used in the Deque.

Example

Expand
>>> :set -XTypeApplications
>>> import qualified RIO.Vector.Unboxed as U
>>> d <- newDeque @U.MVector @Int
>>> mapM_ (pushFrontDeque d) [0..10]
>>> freezeDeque @U.Vector d
[10,9,8,7,6,5,4,3,2,1,0]

Since: rio-0.1.9.0

dequeToVector :: forall v' a (v :: Type -> TYPE LiftedRep -> TYPE LiftedRep) m. (Vector v' a, MVector v a, PrimMonad m) => Deque v (PrimState m) a -> m (v' a) #

Convert to an immutable vector of any type. If resulting pure vector corresponds to the mutable one used by the Deque, it will be more efficient to use freezeDeque instead.

Example

Expand
>>> :set -XTypeApplications
>>> import qualified RIO.Vector.Unboxed as U
>>> import qualified RIO.Vector.Storable as S
>>> d <- newDeque @U.MVector @Int
>>> mapM_ (pushFrontDeque d) [0..10]
>>> dequeToVector @S.Vector d
[10,9,8,7,6,5,4,3,2,1,0]

Since: rio-0.1.9.0

dequeToList :: forall (v :: Type -> TYPE LiftedRep -> TYPE LiftedRep) a m. (MVector v a, PrimMonad m) => Deque v (PrimState m) a -> m [a] #

Convert a Deque into a list. Does not modify the Deque.

Since: rio-0.1.9.0

foldrDeque :: forall (v :: Type -> TYPE LiftedRep -> TYPE LiftedRep) a m acc. (MVector v a, PrimMonad m) => (a -> acc -> m acc) -> acc -> Deque v (PrimState m) a -> m acc #

Fold over a Deque, starting at the end. Does not modify the Deque.

Since: rio-0.1.9.0

foldlDeque :: forall (v :: Type -> TYPE LiftedRep -> TYPE LiftedRep) a m acc. (MVector v a, PrimMonad m) => (acc -> a -> m acc) -> acc -> Deque v (PrimState m) a -> m acc #

Fold over a Deque, starting at the beginning. Does not modify the Deque.

Since: rio-0.1.9.0

pushBackDeque :: forall (v :: Type -> TYPE LiftedRep -> TYPE LiftedRep) a m. (MVector v a, PrimMonad m) => Deque v (PrimState m) a -> a -> m () #

Push a new value to the end of the Deque

Since: rio-0.1.9.0

pushFrontDeque :: forall (v :: Type -> TYPE LiftedRep -> TYPE LiftedRep) a m. (MVector v a, PrimMonad m) => Deque v (PrimState m) a -> a -> m () #

Push a new value to the beginning of the Deque

Since: rio-0.1.9.0

popBackDeque :: forall (v :: Type -> TYPE LiftedRep -> TYPE LiftedRep) a m. (MVector v a, PrimMonad m) => Deque v (PrimState m) a -> m (Maybe a) #

Pop the first value from the end of the Deque

Since: rio-0.1.9.0

popFrontDeque :: forall (v :: Type -> TYPE LiftedRep -> TYPE LiftedRep) a m. (MVector v a, PrimMonad m) => Deque v (PrimState m) a -> m (Maybe a) #

Pop the first value from the beginning of the Deque

Since: rio-0.1.9.0

getDequeSize :: forall m (v :: Type -> Type -> Type) a. PrimMonad m => Deque v (PrimState m) a -> m Int #

O(1) - Get the number of elements that is currently in the Deque

Since: rio-0.1.9.0

newDeque :: forall (v :: Type -> TYPE LiftedRep -> TYPE LiftedRep) a m. (MVector v a, PrimMonad m) => m (Deque v (PrimState m) a) #

Create a new, empty Deque

Since: rio-0.1.9.0

asBDeque :: BDeque s a -> BDeque s a #

Helper function to assist with type inference, forcing usage of a boxed vector.

Since: rio-0.1.9.0

asSDeque :: SDeque s a -> SDeque s a #

Helper function to assist with type inference, forcing usage of a storable vector.

Since: rio-0.1.9.0

asUDeque :: UDeque s a -> UDeque s a #

Helper function to assist with type inference, forcing usage of an unboxed vector.

Since: rio-0.1.9.0

data Deque (v :: Type -> Type -> Type) s a #

A double-ended queue supporting any underlying vector type and any monad.

This implements a circular double-ended queue with exponential growth.

Since: rio-0.1.9.0

type UDeque = Deque MVector #

A Deque specialized to unboxed vectors.

Since: rio-0.1.9.0

type SDeque = Deque MVector #

A Deque specialized to storable vectors.

Since: rio-0.1.9.0

type BDeque = Deque MVector #

A Deque specialized to boxed vectors.

Since: rio-0.1.9.0

readFileUtf8 :: MonadIO m => FilePath -> m Text #

Read a file in UTF8 encoding, throwing an exception on invalid character encoding.

This function will use OS-specific line ending handling.

writeFileBinary :: MonadIO m => FilePath -> ByteString -> m () #

Same as writeFile, but generalized to MonadIO

readFileBinary :: MonadIO m => FilePath -> m ByteString #

Same as readFile, but generalized to MonadIO

hPutBuilder :: MonadIO m => Handle -> Builder -> m () #

writeFileUtf8 :: MonadIO m => FilePath -> Text -> m () #

Write a file in UTF8 encoding

This function will use OS-specific line ending handling.

withLazyFileUtf8 :: MonadUnliftIO m => FilePath -> (Text -> m a) -> m a #

Lazily read a file in UTF8 encoding.

Since: rio-0.1.13

withLazyFile :: MonadUnliftIO m => FilePath -> (ByteString -> m a) -> m a #

Lazily get the contents of a file. Unlike readFile, this ensures that if an exception is thrown, the file handle is closed immediately.

gLogFuncClassic :: (HasLogLevel msg, HasLogSource msg, Display msg) => LogFunc -> GLogFunc msg #

Make a GLogFunc via classic LogFunc. Use this if you'd like to log your generic data type via the classic RIO terminal logger.

Since: rio-0.1.13.0

glog :: (MonadIO m, HasCallStack, HasGLogFunc env, MonadReader env m) => GMsg env -> m () #

Log a value generically.

Since: rio-0.1.13.0

mkGLogFunc :: (CallStack -> msg -> IO ()) -> GLogFunc msg #

Make a custom generic logger. With this you could, for example, write to a database or a log digestion service. For example:

mkGLogFunc (\stack msg -> send (Data.Aeson.encode (JsonLog stack msg)))

Since: rio-0.1.13.0

contramapGLogFunc :: (a -> b) -> GLogFunc b -> GLogFunc a #

A contramap. Use this to wrap sub-loggers via mapRIO.

If you are on base > 4.12.0, you can just use contramap.

Since: rio-0.1.13.0

contramapMaybeGLogFunc :: (a -> Maybe b) -> GLogFunc b -> GLogFunc a #

A vesion of contramapMaybeGLogFunc which supports filering.

Since: rio-0.1.13.0

noLogging :: (HasLogFunc env, MonadReader env m) => m a -> m a #

Disable logging capabilities in a given sub-routine

Intended to skip logging in general purpose implementations, where secrets might be logged accidently.

Since: rio-0.1.5.0

logFuncAccentColorsL :: HasLogFunc env => SimpleGetter env (Int -> Utf8Builder) #

What accent colors, indexed by Int, is the log func configured to use?

Intended for use by code which wants to optionally add additional color to its log messages.

Since: rio-0.1.18.0

logFuncSecondaryColorL :: HasLogFunc env => SimpleGetter env Utf8Builder #

What color is the log func configured to use for secondary content?

Intended for use by code which wants to optionally add additional color to its log messages.

Since: rio-0.1.18.0

logFuncLogLevelColorsL :: HasLogFunc env => SimpleGetter env (LogLevel -> Utf8Builder) #

What color is the log func configured to use for each LogLevel?

Intended for use by code which wants to optionally add additional color to its log messages.

Since: rio-0.1.18.0

logFuncUseColorL :: HasLogFunc env => SimpleGetter env Bool #

Is the log func configured to use color output?

Intended for use by code which wants to optionally add additional color to its log messages.

Since: rio-0.1.0.0

displayCallStack :: CallStack -> Utf8Builder #

Convert a CallStack value into a Utf8Builder indicating the first source location.

TODO Consider showing the entire call stack instead.

Since: rio-0.0.0.0

setLogFormat :: (Utf8Builder -> Utf8Builder) -> LogOptions -> LogOptions #

Set format method for messages

Default: id

Since: rio-0.1.13.0

setLogUseLoc :: Bool -> LogOptions -> LogOptions #

Use code location in the log output.

Default: True if in verbose mode, False otherwise.

Since: rio-0.1.2.0

setLogAccentColors #

Arguments

:: (Int -> Utf8Builder)

This should be a total function.

-> LogOptions 
-> LogOptions 

ANSI color codes for accents in the log output. Accent colors are indexed by Int.

Default: const "\ESC[92m" -- Bright green, for all indicies

Since: rio-0.1.18.0

setLogSecondaryColor :: Utf8Builder -> LogOptions -> LogOptions #

ANSI color codes for secondary content in the log output.

Default: "\ESC[90m" -- Bright black (gray)

Since: rio-0.1.18.0

setLogLevelColors :: (LogLevel -> Utf8Builder) -> LogOptions -> LogOptions #

ANSI color codes for LogLevel in the log output.

Default: LevelDebug = "\ESC[32m" -- Green LevelInfo = "\ESC[34m" -- Blue LevelWarn = "\ESC[33m" -- Yellow LevelError = "\ESC[31m" -- Red LevelOther _ = "\ESC[35m" -- Magenta

Since: rio-0.1.18.0

setLogUseColor :: Bool -> LogOptions -> LogOptions #

Use ANSI color codes in the log output.

Default: True if in verbose mode and the Handle is a terminal device.

Since: rio-0.0.0.0

setLogUseTime :: Bool -> LogOptions -> LogOptions #

Include the time when printing log messages.

Default: True in debug mode, False otherwise.

Since: rio-0.0.0.0

setLogTerminal :: Bool -> LogOptions -> LogOptions #

Do we treat output as a terminal. If True, we will enable sticky logging functionality.

Default: checks if the Handle provided to logOptionsHandle is a terminal with hIsTerminalDevice.

Since: rio-0.0.0.0

setLogVerboseFormatIO :: IO Bool -> LogOptions -> LogOptions #

Refer to setLogVerboseFormat. This modifier allows to alter the verbose format value dynamically at runtime.

Default: follows the value of the verbose flag.

Since: rio-0.1.3.0

setLogVerboseFormat :: Bool -> LogOptions -> LogOptions #

Use the verbose format for printing log messages.

Default: follows the value of the verbose flag.

Since: rio-0.0.0.0

setLogMinLevelIO :: IO LogLevel -> LogOptions -> LogOptions #

Refer to setLogMinLevel. This modifier allows to alter the verbose format value dynamically at runtime.

Default: in verbose mode, LevelDebug. Otherwise, LevelInfo.

Since: rio-0.1.3.0

setLogMinLevel :: LogLevel -> LogOptions -> LogOptions #

Set the minimum log level. Messages below this level will not be printed.

Default: in verbose mode, LevelDebug. Otherwise, LevelInfo.

Since: rio-0.0.0.0

withLogFunc :: MonadUnliftIO m => LogOptions -> (LogFunc -> m a) -> m a #

Given a LogOptions value, run the given function with the specified LogFunc. A common way to use this function is:

let isVerbose = False -- get from the command line instead
logOptions' <- logOptionsHandle stderr isVerbose
let logOptions = setLogUseTime True logOptions'
withLogFunc logOptions $ \lf -> do
  let app = App -- application specific environment
        { appLogFunc = lf
        , appOtherStuff = ...
        }
  runRIO app $ do
    logInfo "Starting app"
    myApp

Since: rio-0.0.0.0

newLogFunc :: (MonadIO n, MonadIO m) => LogOptions -> n (LogFunc, m ()) #

Given a LogOptions value, returns both a new LogFunc and a sub-routine that disposes it.

Intended for use if you want to deal with the teardown of LogFunc yourself, otherwise prefer the withLogFunc function instead.

Since: rio-0.1.3.0

logOptionsHandle #

Arguments

:: MonadIO m 
=> Handle 
-> Bool

Verbose Flag

-> m LogOptions 

Create a LogOptions value from the given Handle and whether to perform verbose logging or not. Individiual settings can be overridden using appropriate set functions. Logging output is guaranteed to be non-interleaved only for a UTF-8 Handle in a multi-thread environment.

When Verbose Flag is True, the following happens:

  • setLogVerboseFormat is called with True
  • setLogUseColor is called with True (except on Windows)
  • setLogUseLoc is called with True
  • setLogUseTime is called with True
  • setLogMinLevel is called with Debug log level

Since: rio-0.0.0.0

logOptionsMemory :: MonadIO m => m (IORef Builder, LogOptions) #

Create a LogOptions value which will store its data in memory. This is primarily intended for testing purposes. This will return both a LogOptions value and an IORef containing the resulting Builder value.

This will default to non-verbose settings and assume there is a terminal attached. These assumptions can be overridden using the appropriate set functions.

Since: rio-0.0.0.0

logStickyDone :: (MonadIO m, HasCallStack, MonadReader env m, HasLogFunc env) => Utf8Builder -> m () #

This will print out the given message with a newline and disable any further stickiness of the line until a new call to logSticky happens.

Since: rio-0.0.0.0

logSticky :: (MonadIO m, HasCallStack, MonadReader env m, HasLogFunc env) => Utf8Builder -> m () #

Write a "sticky" line to the terminal. Any subsequent lines will overwrite this one, and that same line will be repeated below again. In other words, the line sticks at the bottom of the output forever. Running this function again will replace the sticky line with a new sticky line. When you want to get rid of the sticky line, run logStickyDone.

Note that not all LogFunc implementations will support sticky messages as described. However, the withLogFunc implementation provided by this module does.

Since: rio-0.0.0.0

logGeneric :: (MonadIO m, MonadReader env m, HasLogFunc env, HasCallStack) => LogSource -> LogLevel -> Utf8Builder -> m () #

Generic, basic function for creating other logging functions.

Since: rio-0.0.0.0

mkLogFunc :: (CallStack -> LogSource -> LogLevel -> Utf8Builder -> IO ()) -> LogFunc #

Create a LogFunc from the given function.

Since: rio-0.0.0.0

class HasLogFunc env where #

Environment values with a logging function.

Since: rio-0.0.0.0

Methods

logFuncL :: Lens' env LogFunc #

Instances

Instances details
HasLogFunc LogFunc 
Instance details

Defined in RIO.Prelude.Logger

HasLogFunc SimpleApp 
Instance details

Defined in RIO.Prelude.Simple

HasLogFunc LoggedProcessContext 
Instance details

Defined in RIO.Process

data LogFunc #

A logging function, wrapped in a newtype for better error messages.

An implementation may choose any behavior of this value it wishes, including printing to standard output or no action at all.

Since: rio-0.0.0.0

Instances

Instances details
Monoid LogFunc

mempty peforms no logging.

Since: rio-0.0.0.0

Instance details

Defined in RIO.Prelude.Logger

Semigroup LogFunc

Perform both sets of actions per log entry.

Since: rio-0.0.0.0

Instance details

Defined in RIO.Prelude.Logger

HasLogFunc LogFunc 
Instance details

Defined in RIO.Prelude.Logger

data LogOptions #

Configuration for how to create a LogFunc. Intended to be used with the withLogFunc function.

Since: rio-0.0.0.0

type family GMsg env #

Instances

Instances details
type GMsg (GLogFunc msg) 
Instance details

Defined in RIO.Prelude.Logger

type GMsg (GLogFunc msg) = msg

class HasGLogFunc env where #

An app is capable of generic logging if it implements this.

Since: rio-0.1.13.0

Associated Types

type GMsg env #

Methods

gLogFuncL :: Lens' env (GLogFunc (GMsg env)) #

Instances

Instances details
HasGLogFunc (GLogFunc msg)

Quick way to run a RIO that only has a logger in its environment.

Since: rio-0.1.13.0

Instance details

Defined in RIO.Prelude.Logger

Associated Types

type GMsg (GLogFunc msg) #

Methods

gLogFuncL :: Lens' (GLogFunc msg) (GLogFunc (GMsg (GLogFunc msg))) #

data GLogFunc msg #

A generic logger of some type msg.

Your GLocFunc can re-use the existing classical logging framework of RIO, and/or implement additional transforms, filters. Alternatively, you may log to a JSON source in a database, or anywhere else as needed. You can decide how to log levels or severities based on the constructors in your type. You will normally determine this in your main app entry point.

Since: rio-0.1.13.0

Instances

Instances details
Contravariant GLogFunc

Use this instance to wrap sub-loggers via mapRIO.

The Contravariant class is available in base 4.12.0.

Since: rio-0.1.13.0

Instance details

Defined in RIO.Prelude.Logger

Methods

contramap :: (a' -> a) -> GLogFunc a -> GLogFunc a' #

(>$) :: b -> GLogFunc b -> GLogFunc a #

Monoid (GLogFunc msg)

mempty peforms no logging.

Since: rio-0.1.13.0

Instance details

Defined in RIO.Prelude.Logger

Methods

mempty :: GLogFunc msg #

mappend :: GLogFunc msg -> GLogFunc msg -> GLogFunc msg #

mconcat :: [GLogFunc msg] -> GLogFunc msg #

Semigroup (GLogFunc msg)

Perform both sets of actions per log entry.

Since: rio-0.1.13.0

Instance details

Defined in RIO.Prelude.Logger

Methods

(<>) :: GLogFunc msg -> GLogFunc msg -> GLogFunc msg #

sconcat :: NonEmpty (GLogFunc msg) -> GLogFunc msg #

stimes :: Integral b => b -> GLogFunc msg -> GLogFunc msg #

HasGLogFunc (GLogFunc msg)

Quick way to run a RIO that only has a logger in its environment.

Since: rio-0.1.13.0

Instance details

Defined in RIO.Prelude.Logger

Associated Types

type GMsg (GLogFunc msg) #

Methods

gLogFuncL :: Lens' (GLogFunc msg) (GLogFunc (GMsg (GLogFunc msg))) #

type GMsg (GLogFunc msg) 
Instance details

Defined in RIO.Prelude.Logger

type GMsg (GLogFunc msg) = msg

class HasLogLevel msg where #

Level, if any, of your logs. If unknown, use LogOther. Use for your generic log data types that want to sit inside the classic log framework.

Since: rio-0.1.13.0

Methods

getLogLevel :: msg -> LogLevel #

class HasLogSource msg where #

Source of a log. This can be whatever you want. Use for your generic log data types that want to sit inside the classic log framework.

Since: rio-0.1.13.0

Methods

getLogSource :: msg -> LogSource #

tshow :: Show a => a -> Text #

yieldThread :: MonadIO m => m () #

sappend :: Semigroup s => s -> s -> s #

type LText = Text #

asIO :: IO a -> IO a #

Helper function to force an action to run in IO. Especially useful for overly general contexts, like hspec tests.

Since: rio-0.1.3.0

unlessM :: Monad m => m Bool -> m () -> m () #

Run the second value if the first value returns False

whenM :: Monad m => m Bool -> m () -> m () #

Run the second value if the first value returns True

nubOrd :: Ord a => [a] -> [a] #

Strip out duplicates

foldMapM :: (Monad m, Monoid w, Foldable t) => (a -> m w) -> t a -> m w #

Extend foldMap to allow side effects.

Internally, this is implemented using a strict left fold. This is used for performance reasons. It also necessitates that this function has a Monad constraint and not just an Applicative constraint. For more information, see https://github.com/commercialhaskell/rio/pull/99#issuecomment-394179757.

Since: rio-0.1.3.0

forMaybeM :: Monad m => [a] -> (a -> m (Maybe b)) -> m [b] #

mapMaybeM :: Monad m => (a -> m (Maybe b)) -> [a] -> m [b] #

Monadic mapMaybe.

forMaybeA :: Applicative f => [a] -> (a -> f (Maybe b)) -> f [b] #

mapMaybeA :: Applicative f => (a -> f (Maybe b)) -> [a] -> f [b] #

Applicative mapMaybe.

fromFirst :: a -> First a -> a #

Get a First value with a default fallback

mapLeft :: (a1 -> a2) -> Either a1 b -> Either a2 b #

Apply a function to a Left constructor

exitWith :: MonadIO m => ExitCode -> m a #

Lifted version of "System.Exit.exitWith".

@since 0.1.9.0.

exitSuccess :: MonadIO m => m a #

Lifted version of "System.Exit.exitSuccess".

@since 0.1.9.0.

exitFailure :: MonadIO m => m a #

Lifted version of "System.Exit.exitFailure".

@since 0.1.9.0.

writeFileUtf8Builder :: MonadIO m => FilePath -> Utf8Builder -> m () #

Write the given Utf8Builder value to a file.

Since: rio-0.1.0.0

utf8BuilderToLazyText :: Utf8Builder -> Text #

Convert a Utf8Builder value into a lazy Text.

Since: rio-0.1.0.0

utf8BuilderToText :: Utf8Builder -> Text #

Convert a Utf8Builder value into a strict Text.

Since: rio-0.1.0.0

displayBytesUtf8 :: ByteString -> Utf8Builder #

Convert a ByteString into a Utf8Builder.

NOTE This function performs no checks to ensure that the data is, in fact, UTF8 encoded. If you provide non-UTF8 data, later functions may fail.

Since: rio-0.1.0.0

displayShow :: Show a => a -> Utf8Builder #

Use the Show instance for a value to convert it to a Utf8Builder.

Since: rio-0.1.0.0

newtype Utf8Builder #

A builder of binary data, with the invariant that the underlying data is supposed to be UTF-8 encoded.

Since: rio-0.1.0.0

Constructors

Utf8Builder 

Instances

Instances details
IsString Utf8Builder

Since: rio-0.1.0.0

Instance details

Defined in RIO.Prelude.Display

Monoid Utf8Builder 
Instance details

Defined in RIO.Prelude.Display

Semigroup Utf8Builder 
Instance details

Defined in RIO.Prelude.Display

Display Utf8Builder

Since: rio-0.1.0.0

Instance details

Defined in RIO.Prelude.Display

class Display a where #

A typeclass for values which can be converted to a Utf8Builder. The intention of this typeclass is to provide a human-friendly display of the data.

Since: rio-0.1.0.0

Minimal complete definition

display | textDisplay

Methods

display :: a -> Utf8Builder #

textDisplay :: a -> Text #

Display data as Text, which will also be used for display if it is not overriden.

Since: rio-0.1.7.0

Instances

Instances details
Display SomeException

Since: rio-0.1.0.0

Instance details

Defined in RIO.Prelude.Display

Display IOException

Since: rio-0.1.0.0

Instance details

Defined in RIO.Prelude.Display

Display Int16

Since: rio-0.1.0.0

Instance details

Defined in RIO.Prelude.Display

Display Int32

Since: rio-0.1.0.0

Instance details

Defined in RIO.Prelude.Display

Display Int64

Since: rio-0.1.0.0

Instance details

Defined in RIO.Prelude.Display

Display Int8

Since: rio-0.1.0.0

Instance details

Defined in RIO.Prelude.Display

Display Word16

Since: rio-0.1.0.0

Instance details

Defined in RIO.Prelude.Display

Display Word32

Since: rio-0.1.0.0

Instance details

Defined in RIO.Prelude.Display

Display Word64

Since: rio-0.1.0.0

Instance details

Defined in RIO.Prelude.Display

Display Word8

Since: rio-0.1.0.0

Instance details

Defined in RIO.Prelude.Display

Display Utf8Builder

Since: rio-0.1.0.0

Instance details

Defined in RIO.Prelude.Display

Display Text

Since: rio-0.1.0.0

Instance details

Defined in RIO.Prelude.Display

Display Text

Since: rio-0.1.0.0

Instance details

Defined in RIO.Prelude.Display

Display Integer

Since: rio-0.1.0.0

Instance details

Defined in RIO.Prelude.Display

Display Char

Since: rio-0.1.0.0

Instance details

Defined in RIO.Prelude.Display

Display Double 
Instance details

Defined in RIO.Prelude.Display

Display Float

Since: rio-0.1.0.0

Instance details

Defined in RIO.Prelude.Display

Display Int

Since: rio-0.1.0.0

Instance details

Defined in RIO.Prelude.Display

Display Word

Since: rio-0.1.0.0

Instance details

Defined in RIO.Prelude.Display

Display (ProcessConfig a b c)

Since: rio-0.1.0.0

Instance details

Defined in RIO.Prelude.Display

withBinaryFile :: MonadUnliftIO m => FilePath -> IOMode -> (Handle -> m a) -> m a #

Unlifted version of withBinaryFile.

Since: unliftio-0.1.0.0

myThreadId :: MonadIO m => m ThreadId #

Lifted version of myThreadId.

Since: unliftio-0.1.1.0

threadDelay :: MonadIO m => Int -> m () #

Lifted version of threadDelay.

Since: unliftio-0.1.1.0

threadWaitRead :: MonadIO m => Fd -> m () #

Lifted version of threadWaitRead.

Since: unliftio-0.1.1.0

threadWaitWrite :: MonadIO m => Fd -> m () #

Lifted version of threadWaitWrite.

Since: unliftio-0.1.1.0

isCurrentThreadBound :: MonadIO m => m Bool #

Lifted version of isCurrentThreadBound.

Since: unliftio-0.1.1.0

lenientDecode :: OnDecodeError #

Replace an invalid input byte with the Unicode replacement character U+FFFD.

data UnicodeException #

An exception type for representing Unicode encoding errors.

Constructors

DecodeError String (Maybe Word8)

Could not decode a byte sequence because it was invalid under the given encoding, or ran out of input in mid-decode.

EncodeError String (Maybe Char)

Tried to encode a character that could not be represented under the given encoding, or ran out of input in mid-encode.

decodeUtf8' :: ByteString -> Either UnicodeException Text #

Decode a ByteString containing UTF-8 encoded text.

If the input contains any invalid UTF-8 data, the relevant exception will be returned, otherwise the decoded text.

decodeUtf8With :: OnDecodeError -> ByteString -> Text #

Decode a ByteString containing UTF-8 encoded text.

NOTE: The replacement character returned by OnDecodeError MUST be within the BMP plane; surrogate code points will automatically be remapped to the replacement char U+FFFD (since 0.11.3.0), whereas code points beyond the BMP will throw an error (since 1.2.3.1); For earlier versions of text using those unsupported code points would result in undefined behavior.

encodeUtf8Builder :: Text -> Builder #

Encode text to a ByteString Builder using UTF-8 encoding.

Since: text-1.1.0.0

maybeLens :: a -> Lens' (Maybe a) a Source #