lnd-client-0.1.0.0: Lightning Network Daemon (LND) client library for Haskell

Safe HaskellNone
LanguageHaskell2010

LndClient.Import.External

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 :: a -> b -> b #

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

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]

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

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 short, excess elements of the longer list are discarded:

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

zip is right-lazy:

zip [] _|_ = []
zip _|_ [] = _|_

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

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

coerce :: Coercible a b => a -> b #

The function coerce allows you to safely convert between values of types that have the same representation with no run-time overhead. In the simplest case you can use it instead of a newtype constructor, to go from the newtype's concrete type to the abstract type. But it also works in more complicated settings, e.g. converting a list of newtypes to a list of concrete types.

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.

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

Since: base-2.1

Instance details

Defined in GHC.Int

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 Ordering

Since: base-2.1

Instance details

Defined in GHC.Enum

Bounded Word

Since: base-2.1

Instance details

Defined in GHC.Enum

Bounded Word8

Since: base-2.1

Instance details

Defined in GHC.Word

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

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

minBound :: () #

maxBound :: () #

Bounded CDev 
Instance details

Defined in System.Posix.Types

Bounded CIno 
Instance details

Defined in System.Posix.Types

Bounded CMode 
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 CSsize 
Instance details

Defined in System.Posix.Types

Bounded CGid 
Instance details

Defined in System.Posix.Types

Bounded CNlink 
Instance details

Defined in System.Posix.Types

Bounded CUid 
Instance details

Defined in System.Posix.Types

Bounded CTcflag 
Instance details

Defined in System.Posix.Types

Bounded CRLim 
Instance details

Defined in System.Posix.Types

Bounded CBlkSize 
Instance details

Defined in System.Posix.Types

Bounded CBlkCnt 
Instance details

Defined in System.Posix.Types

Bounded CClockId 
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 CId 
Instance details

Defined in System.Posix.Types

Methods

minBound :: CId #

maxBound :: CId #

Bounded CKey 
Instance details

Defined in System.Posix.Types

Bounded Fd 
Instance details

Defined in System.Posix.Types

Methods

minBound :: Fd #

maxBound :: Fd #

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 Associativity

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 SourceStrictness

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

Defined in Codec.Compression.Zlib.Stream

Bounded Method 
Instance details

Defined in Codec.Compression.Zlib.Stream

Bounded CompressionStrategy 
Instance details

Defined in Codec.Compression.Zlib.Stream

Bounded Month 
Instance details

Defined in Chronos

Methods

minBound :: Month #

maxBound :: Month #

Bounded OffsetFormat 
Instance details

Defined in Chronos

Methods

minBound :: OffsetFormat #

maxBound :: OffsetFormat #

Bounded Time 
Instance details

Defined in Chronos

Methods

minBound :: Time #

maxBound :: Time #

Bounded TimeInterval 
Instance details

Defined in Chronos

Methods

minBound :: TimeInterval #

maxBound :: TimeInterval #

Bounded IsolationLevel 
Instance details

Defined in Database.Persist.Sql.Types.Internal

Methods

minBound :: IsolationLevel #

maxBound :: IsolationLevel #

Bounded Checkmark 
Instance details

Defined in Database.Persist.Types.Base

Methods

minBound :: Checkmark #

maxBound :: Checkmark #

Bounded Severity 
Instance details

Defined in Katip.Core

Bounded Verbosity 
Instance details

Defined in Katip.Core

Bounded Undefined 
Instance details

Defined in Universum.Debug

Bounded Leniency 
Instance details

Defined in Data.String.Conv

Methods

minBound :: Leniency #

maxBound :: Leniency #

Bounded ErrorLevel 
Instance details

Defined in Codec.QRCode.Data.ErrorLevel

Methods

minBound :: ErrorLevel #

maxBound :: ErrorLevel #

Bounded StreamingType 
Instance details

Defined in Data.ProtoLens.Service.Types

Methods

minBound :: StreamingType #

maxBound :: StreamingType #

Bounded ResolutionType Source # 
Instance details

Defined in Proto.LndGrpc

Bounded ResolutionOutcome Source # 
Instance details

Defined in Proto.LndGrpc

Bounded PendingChannelsResponse'ForceClosedChannel'AnchorState Source # 
Instance details

Defined in Proto.LndGrpc

Bounded PeerEvent'EventType Source # 
Instance details

Defined in Proto.LndGrpc

Bounded Peer'SyncType Source # 
Instance details

Defined in Proto.LndGrpc

Bounded PaymentFailureReason Source # 
Instance details

Defined in Proto.LndGrpc

Bounded Payment'PaymentStatus Source # 
Instance details

Defined in Proto.LndGrpc

Bounded NodeMetricType Source # 
Instance details

Defined in Proto.LndGrpc

Bounded InvoiceHTLCState Source # 
Instance details

Defined in Proto.LndGrpc

Bounded Invoice'InvoiceState Source # 
Instance details

Defined in Proto.LndGrpc

Bounded Initiator Source # 
Instance details

Defined in Proto.LndGrpc

Bounded HTLCAttempt'HTLCStatus Source # 
Instance details

Defined in Proto.LndGrpc

Bounded FeatureBit Source # 
Instance details

Defined in Proto.LndGrpc

Bounded Failure'FailureCode Source # 
Instance details

Defined in Proto.LndGrpc

Bounded CommitmentType Source # 
Instance details

Defined in Proto.LndGrpc

Bounded ChannelEventUpdate'UpdateType Source # 
Instance details

Defined in Proto.LndGrpc

Bounded ChannelCloseSummary'ClosureType Source # 
Instance details

Defined in Proto.LndGrpc

Bounded AddressType Source # 
Instance details

Defined in Proto.LndGrpc

Bounded Encoding 
Instance details

Defined in Basement.String

Methods

minBound :: Encoding #

maxBound :: Encoding #

Bounded UTF32_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF32

Methods

minBound :: UTF32_Invalid #

maxBound :: UTF32_Invalid #

Bounded SettingsKeyId 
Instance details

Defined in Network.HTTP2.Types

Methods

minBound :: SettingsKeyId #

maxBound :: SettingsKeyId #

Bounded ResolveHoldForwardAction Source # 
Instance details

Defined in Proto.RouterGrpc

Bounded PaymentState Source # 
Instance details

Defined in Proto.RouterGrpc

Bounded HtlcEvent'EventType Source # 
Instance details

Defined in Proto.RouterGrpc

Bounded FailureDetail Source # 
Instance details

Defined in Proto.RouterGrpc

Bounded ChanStatusAction Source # 
Instance details

Defined in Proto.RouterGrpc

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 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 (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 m => Bounded (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Bounded a => Bounded (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

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

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

minBound :: Sum a #

maxBound :: Sum a #

Bounded a => Bounded (Product a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

(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 (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 c) => Bounded (a, b, c)

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c) #

maxBound :: (a, b, c) #

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

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

succ :: a -> a #

the successor of a value. For numeric types, succ adds 1.

pred :: a -> a #

the predecessor of a value. For numeric types, pred subtracts 1.

toEnum :: Int -> a #

Convert from an Int.

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.

enumFrom :: a -> [a] #

Used in Haskell's translation of [n..] with [n..] = enumFrom n, a possible implementation being enumFrom n = n : enumFrom (succ n). For example:

  • enumFrom 4 :: [Integer] = [4,5,6,7,...]
  • enumFrom 6 :: [Int] = [6,7,8,9,...,maxBound :: Int]

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

Used in Haskell's translation of [n,n'..] with [n,n'..] = enumFromThen n n', a possible implementation being enumFromThen n n' = n : n' : worker (f x) (f x n'), worker s v = v : worker s (s v), x = fromEnum n' - fromEnum n and f n y | n > 0 = f (n - 1) (succ y) | n < 0 = f (n + 1) (pred y) | otherwise = y For example:

  • enumFromThen 4 6 :: [Integer] = [4,6,8,10...]
  • enumFromThen 6 2 :: [Int] = [6,2,-2,-6,...,minBound :: Int]

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

Used in Haskell's translation of [n..m] with [n..m] = enumFromTo n m, a possible implementation being enumFromTo n m | n <= m = n : enumFromTo (succ n) m | otherwise = []. For example:

  • enumFromTo 6 10 :: [Int] = [6,7,8,9,10]
  • enumFromTo 42 1 :: [Integer] = []

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

Used in Haskell's translation of [n,n'..m] with [n,n'..m] = enumFromThenTo n n' m, a possible implementation being enumFromThenTo n n' m = worker (f x) (c x) n m, x = fromEnum n' - fromEnum n, c x = bool (>=) ((x 0) f n y | n > 0 = f (n - 1) (succ y) | n < 0 = f (n + 1) (pred y) | otherwise = y and worker s c v m | c v m = v : worker s c (s v) m | otherwise = [] For example:

  • enumFromThenTo 4 2 -6 :: [Integer] = [4,2,0,-2,-4,-6]
  • enumFromThenTo 6 8 2 :: [Int] = []
Instances
Enum 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 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 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 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 Ordering

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

Enum Word8

Since: base-2.1

Instance details

Defined in GHC.Word

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

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

succ :: () -> () #

pred :: () -> () #

toEnum :: Int -> () #

fromEnum :: () -> Int #

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

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

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

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

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 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 CMode 
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 CSsize 
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 CNlink 
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 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 CSpeed 
Instance details

Defined in System.Posix.Types

Enum CTcflag 
Instance details

Defined in System.Posix.Types

Enum CRLim 
Instance details

Defined in System.Posix.Types

Enum CBlkSize 
Instance details

Defined in System.Posix.Types

Enum CBlkCnt 
Instance details

Defined in System.Posix.Types

Enum CClockId 
Instance details

Defined in System.Posix.Types

Enum CFsBlkCnt 
Instance details

Defined in System.Posix.Types

Enum CFsFilCnt 
Instance details

Defined in System.Posix.Types

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

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 SourceStrictness

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 IOMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.IOMode

Enum Extension 
Instance details

Defined in GHC.LanguageExtensions.Type

Enum FPFormat 
Instance details

Defined in Data.Text.Lazy.Builder.RealFloat

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

Defined in Codec.Compression.Zlib.Stream

Enum Method 
Instance details

Defined in Codec.Compression.Zlib.Stream

Enum CompressionStrategy 
Instance details

Defined in Codec.Compression.Zlib.Stream

Enum Date 
Instance details

Defined in Chronos

Methods

succ :: Date -> Date #

pred :: Date -> Date #

toEnum :: Int -> Date #

fromEnum :: Date -> Int #

enumFrom :: Date -> [Date] #

enumFromThen :: Date -> Date -> [Date] #

enumFromTo :: Date -> Date -> [Date] #

enumFromThenTo :: Date -> Date -> Date -> [Date] #

Enum Day 
Instance details

Defined in Chronos

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

Defined in Chronos

Methods

succ :: DayOfMonth -> DayOfMonth #

pred :: DayOfMonth -> DayOfMonth #

toEnum :: Int -> DayOfMonth #

fromEnum :: DayOfMonth -> Int #

enumFrom :: DayOfMonth -> [DayOfMonth] #

enumFromThen :: DayOfMonth -> DayOfMonth -> [DayOfMonth] #

enumFromTo :: DayOfMonth -> DayOfMonth -> [DayOfMonth] #

enumFromThenTo :: DayOfMonth -> DayOfMonth -> DayOfMonth -> [DayOfMonth] #

Enum Month 
Instance details

Defined in Chronos

Methods

succ :: Month -> Month #

pred :: Month -> Month #

toEnum :: Int -> Month #

fromEnum :: Month -> Int #

enumFrom :: Month -> [Month] #

enumFromThen :: Month -> Month -> [Month] #

enumFromTo :: Month -> Month -> [Month] #

enumFromThenTo :: Month -> Month -> Month -> [Month] #

Enum Offset 
Instance details

Defined in Chronos

Methods

succ :: Offset -> Offset #

pred :: Offset -> Offset #

toEnum :: Int -> Offset #

fromEnum :: Offset -> Int #

enumFrom :: Offset -> [Offset] #

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

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

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

Enum OffsetFormat 
Instance details

Defined in Chronos

Methods

succ :: OffsetFormat -> OffsetFormat #

pred :: OffsetFormat -> OffsetFormat #

toEnum :: Int -> OffsetFormat #

fromEnum :: OffsetFormat -> Int #

enumFrom :: OffsetFormat -> [OffsetFormat] #

enumFromThen :: OffsetFormat -> OffsetFormat -> [OffsetFormat] #

enumFromTo :: OffsetFormat -> OffsetFormat -> [OffsetFormat] #

enumFromThenTo :: OffsetFormat -> OffsetFormat -> OffsetFormat -> [OffsetFormat] #

Enum OrdinalDate 
Instance details

Defined in Chronos

Methods

succ :: OrdinalDate -> OrdinalDate #

pred :: OrdinalDate -> OrdinalDate #

toEnum :: Int -> OrdinalDate #

fromEnum :: OrdinalDate -> Int #

enumFrom :: OrdinalDate -> [OrdinalDate] #

enumFromThen :: OrdinalDate -> OrdinalDate -> [OrdinalDate] #

enumFromTo :: OrdinalDate -> OrdinalDate -> [OrdinalDate] #

enumFromThenTo :: OrdinalDate -> OrdinalDate -> OrdinalDate -> [OrdinalDate] #

Enum Clock 
Instance details

Defined in System.Clock

Methods

succ :: Clock -> Clock #

pred :: Clock -> Clock #

toEnum :: Int -> Clock #

fromEnum :: Clock -> Int #

enumFrom :: Clock -> [Clock] #

enumFromThen :: Clock -> Clock -> [Clock] #

enumFromTo :: Clock -> Clock -> [Clock] #

enumFromThenTo :: Clock -> Clock -> Clock -> [Clock] #

Enum IsolationLevel 
Instance details

Defined in Database.Persist.Sql.Types.Internal

Methods

succ :: IsolationLevel -> IsolationLevel #

pred :: IsolationLevel -> IsolationLevel #

toEnum :: Int -> IsolationLevel #

fromEnum :: IsolationLevel -> Int #

enumFrom :: IsolationLevel -> [IsolationLevel] #

enumFromThen :: IsolationLevel -> IsolationLevel -> [IsolationLevel] #

enumFromTo :: IsolationLevel -> IsolationLevel -> [IsolationLevel] #

enumFromThenTo :: IsolationLevel -> IsolationLevel -> IsolationLevel -> [IsolationLevel] #

Enum Checkmark 
Instance details

Defined in Database.Persist.Types.Base

Methods

succ :: Checkmark -> Checkmark #

pred :: Checkmark -> Checkmark #

toEnum :: Int -> Checkmark #

fromEnum :: Checkmark -> Int #

enumFrom :: Checkmark -> [Checkmark] #

enumFromThen :: Checkmark -> Checkmark -> [Checkmark] #

enumFromTo :: Checkmark -> Checkmark -> [Checkmark] #

enumFromThenTo :: Checkmark -> Checkmark -> Checkmark -> [Checkmark] #

Enum Severity 
Instance details

Defined in Katip.Core

Enum Verbosity 
Instance details

Defined in Katip.Core

Enum Undefined 
Instance details

Defined in Universum.Debug

Enum Leniency 
Instance details

Defined in Data.String.Conv

Methods

succ :: Leniency -> Leniency #

pred :: Leniency -> Leniency #

toEnum :: Int -> Leniency #

fromEnum :: Leniency -> Int #

enumFrom :: Leniency -> [Leniency] #

enumFromThen :: Leniency -> Leniency -> [Leniency] #

enumFromTo :: Leniency -> Leniency -> [Leniency] #

enumFromThenTo :: Leniency -> Leniency -> Leniency -> [Leniency] #

Enum ErrorLevel 
Instance details

Defined in Codec.QRCode.Data.ErrorLevel

Methods

succ :: ErrorLevel -> ErrorLevel #

pred :: ErrorLevel -> ErrorLevel #

toEnum :: Int -> ErrorLevel #

fromEnum :: ErrorLevel -> Int #

enumFrom :: ErrorLevel -> [ErrorLevel] #

enumFromThen :: ErrorLevel -> ErrorLevel -> [ErrorLevel] #

enumFromTo :: ErrorLevel -> ErrorLevel -> [ErrorLevel] #

enumFromThenTo :: ErrorLevel -> ErrorLevel -> ErrorLevel -> [ErrorLevel] #

Enum StreamingType 
Instance details

Defined in Data.ProtoLens.Service.Types

Methods

succ :: StreamingType -> StreamingType #

pred :: StreamingType -> StreamingType #

toEnum :: Int -> StreamingType #

fromEnum :: StreamingType -> Int #

enumFrom :: StreamingType -> [StreamingType] #

enumFromThen :: StreamingType -> StreamingType -> [StreamingType] #

enumFromTo :: StreamingType -> StreamingType -> [StreamingType] #

enumFromThenTo :: StreamingType -> StreamingType -> StreamingType -> [StreamingType] #

Enum ResolutionType Source # 
Instance details

Defined in Proto.LndGrpc

Enum ResolutionOutcome Source # 
Instance details

Defined in Proto.LndGrpc

Enum PendingChannelsResponse'ForceClosedChannel'AnchorState Source # 
Instance details

Defined in Proto.LndGrpc

Enum PeerEvent'EventType Source # 
Instance details

Defined in Proto.LndGrpc

Enum Peer'SyncType Source # 
Instance details

Defined in Proto.LndGrpc

Enum PaymentFailureReason Source # 
Instance details

Defined in Proto.LndGrpc

Enum Payment'PaymentStatus Source # 
Instance details

Defined in Proto.LndGrpc

Enum NodeMetricType Source # 
Instance details

Defined in Proto.LndGrpc

Enum InvoiceHTLCState Source # 
Instance details

Defined in Proto.LndGrpc

Enum Invoice'InvoiceState Source # 
Instance details

Defined in Proto.LndGrpc

Enum Initiator Source # 
Instance details

Defined in Proto.LndGrpc

Enum HTLCAttempt'HTLCStatus Source # 
Instance details

Defined in Proto.LndGrpc

Enum FeatureBit Source # 
Instance details

Defined in Proto.LndGrpc

Enum Failure'FailureCode Source # 
Instance details

Defined in Proto.LndGrpc

Enum CommitmentType Source # 
Instance details

Defined in Proto.LndGrpc

Enum ChannelEventUpdate'UpdateType Source # 
Instance details

Defined in Proto.LndGrpc

Enum ChannelCloseSummary'ClosureType Source # 
Instance details

Defined in Proto.LndGrpc

Enum AddressType Source # 
Instance details

Defined in Proto.LndGrpc

Enum Encoding 
Instance details

Defined in Basement.String

Methods

succ :: Encoding -> Encoding #

pred :: Encoding -> Encoding #

toEnum :: Int -> Encoding #

fromEnum :: Encoding -> Int #

enumFrom :: Encoding -> [Encoding] #

enumFromThen :: Encoding -> Encoding -> [Encoding] #

enumFromTo :: Encoding -> Encoding -> [Encoding] #

enumFromThenTo :: Encoding -> Encoding -> Encoding -> [Encoding] #

Enum UTF32_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF32

Methods

succ :: UTF32_Invalid -> UTF32_Invalid #

pred :: UTF32_Invalid -> UTF32_Invalid #

toEnum :: Int -> UTF32_Invalid #

fromEnum :: UTF32_Invalid -> Int #

enumFrom :: UTF32_Invalid -> [UTF32_Invalid] #

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

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

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

Enum CryptoError 
Instance details

Defined in Crypto.Error.Types

Methods

succ :: CryptoError -> CryptoError #

pred :: CryptoError -> CryptoError #

toEnum :: Int -> CryptoError #

fromEnum :: CryptoError -> Int #

enumFrom :: CryptoError -> [CryptoError] #

enumFromThen :: CryptoError -> CryptoError -> [CryptoError] #

enumFromTo :: CryptoError -> CryptoError -> [CryptoError] #

enumFromThenTo :: CryptoError -> CryptoError -> CryptoError -> [CryptoError] #

Enum ExtKeyUsageFlag 
Instance details

Defined in Data.X509.Ext

Methods

succ :: ExtKeyUsageFlag -> ExtKeyUsageFlag #

pred :: ExtKeyUsageFlag -> ExtKeyUsageFlag #

toEnum :: Int -> ExtKeyUsageFlag #

fromEnum :: ExtKeyUsageFlag -> Int #

enumFrom :: ExtKeyUsageFlag -> [ExtKeyUsageFlag] #

enumFromThen :: ExtKeyUsageFlag -> ExtKeyUsageFlag -> [ExtKeyUsageFlag] #

enumFromTo :: ExtKeyUsageFlag -> ExtKeyUsageFlag -> [ExtKeyUsageFlag] #

enumFromThenTo :: ExtKeyUsageFlag -> ExtKeyUsageFlag -> ExtKeyUsageFlag -> [ExtKeyUsageFlag] #

Enum ReasonFlag 
Instance details

Defined in Data.X509.Ext

Methods

succ :: ReasonFlag -> ReasonFlag #

pred :: ReasonFlag -> ReasonFlag #

toEnum :: Int -> ReasonFlag #

fromEnum :: ReasonFlag -> Int #

enumFrom :: ReasonFlag -> [ReasonFlag] #

enumFromThen :: ReasonFlag -> ReasonFlag -> [ReasonFlag] #

enumFromTo :: ReasonFlag -> ReasonFlag -> [ReasonFlag] #

enumFromThenTo :: ReasonFlag -> ReasonFlag -> ReasonFlag -> [ReasonFlag] #

Enum PortNumber 
Instance details

Defined in Network.Socket.Types

Methods

succ :: PortNumber -> PortNumber #

pred :: PortNumber -> PortNumber #

toEnum :: Int -> PortNumber #

fromEnum :: PortNumber -> Int #

enumFrom :: PortNumber -> [PortNumber] #

enumFromThen :: PortNumber -> PortNumber -> [PortNumber] #

enumFromTo :: PortNumber -> PortNumber -> [PortNumber] #

enumFromThenTo :: PortNumber -> PortNumber -> PortNumber -> [PortNumber] #

Enum SettingsKeyId 
Instance details

Defined in Network.HTTP2.Types

Methods

succ :: SettingsKeyId -> SettingsKeyId #

pred :: SettingsKeyId -> SettingsKeyId #

toEnum :: Int -> SettingsKeyId #

fromEnum :: SettingsKeyId -> Int #

enumFrom :: SettingsKeyId -> [SettingsKeyId] #

enumFromThen :: SettingsKeyId -> SettingsKeyId -> [SettingsKeyId] #

enumFromTo :: SettingsKeyId -> SettingsKeyId -> [SettingsKeyId] #

enumFromThenTo :: SettingsKeyId -> SettingsKeyId -> SettingsKeyId -> [SettingsKeyId] #

Enum ResolveHoldForwardAction Source # 
Instance details

Defined in Proto.RouterGrpc

Enum PaymentState Source # 
Instance details

Defined in Proto.RouterGrpc

Enum HtlcEvent'EventType Source # 
Instance details

Defined in Proto.RouterGrpc

Enum FailureDetail Source # 
Instance details

Defined in Proto.RouterGrpc

Enum ChanStatusAction Source # 
Instance details

Defined in Proto.RouterGrpc

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

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

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Enum a => Enum (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

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 (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 (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, == is customarily expected to implement an equivalence relationship where two values comparing equal are indistinguishable by "public" functions, with a "public" function being one not allowing to see implementation details. For example, for a type representing non-normalised natural numbers modulo 100, a "public" function doesn't make the difference between 1 and 201. It is expected to have the following properties:

Reflexivity
x == x = True
Symmetry
x == y = y == x
Transitivity
if x == y && y == z = True, then x == z = True
Substitutivity
if x == y = True and f is a "public" 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
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 substitutivity:

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

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

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

(/=) :: Int8 -> Int8 -> 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 Integer 
Instance details

Defined in GHC.Integer.Type

Methods

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

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

Eq Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Natural

Methods

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

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

Eq Ordering 
Instance details

Defined in GHC.Classes

Eq Word 
Instance details

Defined in GHC.Classes

Methods

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

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

Eq Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Methods

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

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

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

Defined in Data.Typeable.Internal

Eq Exp 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Match 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Clause 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Pat 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Type 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Dec 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Name 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq FunDep 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq InjectivityAnn 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Overlap 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq () 
Instance details

Defined in GHC.Classes

Methods

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

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

Eq TyCon 
Instance details

Defined in GHC.Classes

Methods

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

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

Eq Module 
Instance details

Defined in GHC.Classes

Methods

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

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

Eq TrName 
Instance details

Defined in GHC.Classes

Methods

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

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

Eq Handle

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Handle.Types

Methods

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

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

Eq BigNat 
Instance details

Defined in GHC.Integer.Type

Methods

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

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

Eq Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Methods

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

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

Eq SpecConstrAnnotation

Since: base-4.3.0.0

Instance details

Defined in GHC.Exts

Eq Version

Since: base-2.1

Instance details

Defined in Data.Version

Methods

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

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

Eq ThreadId

Since: base-4.2.0.0

Instance details

Defined in GHC.Conc.Sync

Eq BlockReason

Since: base-4.3.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 CDev 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CIno 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CMode 
Instance details

Defined in System.Posix.Types

Methods

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

(/=) :: CMode -> CMode -> 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 CSsize 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CGid 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CNlink 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CUid 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CCc 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CSpeed 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CTcflag 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CRLim 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CBlkSize 
Instance details

Defined in System.Posix.Types

Eq CBlkCnt 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CClockId 
Instance details

Defined in System.Posix.Types

Eq CFsBlkCnt 
Instance details

Defined in System.Posix.Types

Eq CFsFilCnt 
Instance details

Defined in System.Posix.Types

Eq CId 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CKey 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CTimer 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq Fd 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq AsyncException

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Exception

Eq ArrayException

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 BufferMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Handle.Types

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 MaskingState

Since: base-4.3.0.0

Instance details

Defined in GHC.IO

Eq IOException

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Eq ErrorCall

Since: base-4.7.0.0

Instance details

Defined in GHC.Exception

Eq ArithException

Since: base-3.0

Instance details

Defined in GHC.Exception.Type

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 Fixity

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Methods

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

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

Eq Associativity

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Eq SourceUnpackedness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Eq SourceStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Eq DecidedStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

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 IOMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.IOMode

Methods

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

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

Eq Lexeme

Since: base-2.1

Instance details

Defined in Text.Read.Lex

Methods

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

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

Eq Number

Since: base-4.6.0.0

Instance details

Defined in Text.Read.Lex

Methods

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

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

Eq SrcLoc

Since: base-4.9.0.0

Instance details

Defined in GHC.Stack.Types

Methods

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

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

Eq ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Eq ByteString 
Instance details

Defined in Data.ByteString.Internal

Eq IntSet 
Instance details

Defined in Data.IntSet.Internal

Methods

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

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

Eq Extension 
Instance details

Defined in GHC.LanguageExtensions.Type

Eq ForeignSrcLang 
Instance details

Defined in GHC.ForeignSrcLang.Type

Eq Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Methods

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

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

Eq TextDetails 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Eq Style 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

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

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

Eq Mode 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

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

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

Eq ModName 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq PkgName 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Module 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq OccName 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq NameFlavour 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq NameSpace 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Loc 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Info 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq ModuleInfo 
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 Lit 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Body 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Guard 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Stmt 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Range 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq DerivClause 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq DerivStrategy 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq TypeFamilyHead 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq TySynEqn 
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 Callconv 
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 Pragma 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Inline 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq RuleMatch 
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 RuleBndr 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq AnnTarget 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq SourceUnpackedness 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq SourceStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq DecidedStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Con 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Bang 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq PatSynDir 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq PatSynArgs 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq TyVarBndr 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq FamilyResultSig 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq TyLit 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Role 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq AnnLookup 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Builder 
Instance details

Defined in Data.Text.Internal.Builder

Methods

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

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

Eq UnicodeException 
Instance details

Defined in Data.Text.Encoding.Error

Eq LocalTime 
Instance details

Defined in Data.Time.LocalTime.Internal.LocalTime

Eq UniversalTime 
Instance details

Defined in Data.Time.Clock.Internal.UniversalTime

Eq UTCTime 
Instance details

Defined in Data.Time.Clock.Internal.UTCTime

Methods

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

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

Eq AbsoluteTime 
Instance details

Defined in Data.Time.Clock.Internal.AbsoluteTime

Eq Day 
Instance details

Defined in Data.Time.Calendar.Days

Methods

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

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

Eq DictionaryHash 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

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

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

Eq Format 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

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

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

Eq Method 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

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

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

Eq CompressionLevel 
Instance details

Defined in Codec.Compression.Zlib.Stream

Eq WindowBits 
Instance details

Defined in Codec.Compression.Zlib.Stream

Eq MemoryLevel 
Instance details

Defined in Codec.Compression.Zlib.Stream

Eq CompressionStrategy 
Instance details

Defined in Codec.Compression.Zlib.Stream

Eq Date 
Instance details

Defined in Chronos

Methods

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

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

Eq Datetime 
Instance details

Defined in Chronos

Methods

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

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

Eq DatetimeFormat 
Instance details

Defined in Chronos

Methods

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

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

Eq Day 
Instance details

Defined in Chronos

Methods

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

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

Eq DayOfMonth 
Instance details

Defined in Chronos

Methods

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

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

Eq DayOfWeek 
Instance details

Defined in Chronos

Methods

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

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

Eq DayOfYear 
Instance details

Defined in Chronos

Methods

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

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

Eq Month 
Instance details

Defined in Chronos

Methods

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

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

Eq MonthDate 
Instance details

Defined in Chronos

Methods

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

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

Eq Offset 
Instance details

Defined in Chronos

Methods

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

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

Eq OffsetDatetime 
Instance details

Defined in Chronos

Methods

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

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

Eq OffsetFormat 
Instance details

Defined in Chronos

Methods

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

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

Eq OrdinalDate 
Instance details

Defined in Chronos

Methods

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

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

Eq SubsecondPrecision 
Instance details

Defined in Chronos

Eq Time 
Instance details

Defined in Chronos

Methods

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

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

Eq TimeInterval 
Instance details

Defined in Chronos

Methods

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

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

Eq TimeOfDay 
Instance details

Defined in Chronos

Methods

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

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

Eq TimeParts 
Instance details

Defined in Chronos

Methods

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

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

Eq Timespan 
Instance details

Defined in Chronos

Eq Year 
Instance details

Defined in Chronos

Methods

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

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

Eq Value 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

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

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

Eq JSONPathElement 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

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

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

Eq Pos 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

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

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

Eq More 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

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

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

Eq ByteArray 
Instance details

Defined in Data.Primitive.ByteArray

Methods

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

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

Eq Clock 
Instance details

Defined in System.Clock

Methods

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

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

Eq AsyncCancelled 
Instance details

Defined in Control.Concurrent.Async

Methods

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

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

Eq DotNetTime 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

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

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

Eq SumEncoding 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

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

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

Eq OverflowNatural 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

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

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

Eq IsolationLevel 
Instance details

Defined in Database.Persist.Sql.Types.Internal

Methods

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

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

Eq CascadeAction 
Instance details

Defined in Database.Persist.Types.Base

Methods

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

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

Eq Checkmark 
Instance details

Defined in Database.Persist.Types.Base

Methods

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

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

Eq CompositeDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

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

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

Eq DBName 
Instance details

Defined in Database.Persist.Types.Base

Methods

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

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

Eq EmbedEntityDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

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

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

Eq EmbedFieldDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

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

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

Eq EntityDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

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

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

Eq FieldAttr 
Instance details

Defined in Database.Persist.Types.Base

Methods

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

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

Eq FieldCascade 
Instance details

Defined in Database.Persist.Types.Base

Methods

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

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

Eq FieldDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

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

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

Eq FieldType 
Instance details

Defined in Database.Persist.Types.Base

Methods

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

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

Eq ForeignDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

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

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

Eq HaskellName 
Instance details

Defined in Database.Persist.Types.Base

Methods

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

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

Eq IsNullable 
Instance details

Defined in Database.Persist.Types.Base

Methods

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

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

Eq PersistValue 
Instance details

Defined in Database.Persist.Types.Base

Methods

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

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

Eq ReferenceDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

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

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

Eq SqlType 
Instance details

Defined in Database.Persist.Types.Base

Methods

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

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

Eq UniqueDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

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

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

Eq WhyNullable 
Instance details

Defined in Database.Persist.Types.Base

Methods

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

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

Eq Environment 
Instance details

Defined in Katip.Core

Methods

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

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

Eq LogStr 
Instance details

Defined in Katip.Core

Methods

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

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

Eq Namespace 
Instance details

Defined in Katip.Core

Eq PayloadSelection 
Instance details

Defined in Katip.Core

Methods

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

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

Eq ScribeSettings 
Instance details

Defined in Katip.Core

Methods

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

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

Eq Severity 
Instance details

Defined in Katip.Core

Eq ThreadIdText 
Instance details

Defined in Katip.Core

Methods

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

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

Eq Verbosity 
Instance details

Defined in Katip.Core

Eq ColorStrategy 
Instance details

Defined in Katip.Scribes.Handle

Eq Undefined 
Instance details

Defined in Universum.Debug

Eq ConcException 
Instance details

Defined in UnliftIO.Internals.Async

Methods

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

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

Eq UnixDiffTime 
Instance details

Defined in Data.UnixTime.Types

Methods

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

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

Eq UnixTime 
Instance details

Defined in Data.UnixTime.Types

Methods

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

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

Eq Scientific 
Instance details

Defined in Data.Scientific

Methods

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

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

Eq TimeSpec 
Instance details

Defined in System.Clock

Methods

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

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

Eq ConstructorInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

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

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

Eq ConstructorVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

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

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

Eq DatatypeInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

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

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

Eq DatatypeVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

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

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

Eq FieldStrictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

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

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

Eq Strictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

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

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

Eq Unpackedness 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

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

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

Eq LogLevel 
Instance details

Defined in Control.Monad.Logger

Methods

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

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

Eq UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

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

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

Eq UnpackedUUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

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

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

Eq Addr 
Instance details

Defined in Data.Primitive.Types

Methods

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

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

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

Defined in Data.String.Conv

Methods

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

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

Eq ClientError 
Instance details

Defined in Network.HTTP2.Client.Exceptions

Methods

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

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

Eq LndError Source # 
Instance details

Defined in LndClient.Data.Type

Eq TxKind Source # 
Instance details

Defined in LndClient.Data.Kind

Methods

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

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

Eq Tag 
Instance details

Defined in Data.ProtoLens.Encoding.Wire

Methods

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

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

Eq TaggedValue 
Instance details

Defined in Data.ProtoLens.Encoding.Wire

Methods

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

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

Eq DynamicImage 
Instance details

Defined in Codec.Picture.Types

Methods

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

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

Eq PixelCMYK16 
Instance details

Defined in Codec.Picture.Types

Methods

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

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

Eq PixelCMYK8 
Instance details

Defined in Codec.Picture.Types

Methods

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

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

Eq PixelRGB16 
Instance details

Defined in Codec.Picture.Types

Methods

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

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

Eq PixelRGB8 
Instance details

Defined in Codec.Picture.Types

Methods

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

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

Eq PixelRGBA16 
Instance details

Defined in Codec.Picture.Types

Methods

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

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

Eq PixelRGBA8 
Instance details

Defined in Codec.Picture.Types

Methods

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

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

Eq PixelRGBF 
Instance details

Defined in Codec.Picture.Types

Methods

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

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

Eq PixelYA16 
Instance details

Defined in Codec.Picture.Types

Methods

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

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

Eq PixelYA8 
Instance details

Defined in Codec.Picture.Types

Methods

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

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

Eq PixelYCbCr8 
Instance details

Defined in Codec.Picture.Types

Methods

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

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

Eq ErrorLevel 
Instance details

Defined in Codec.QRCode.Data.ErrorLevel

Methods

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

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

Eq PixelYCbCrK8 
Instance details

Defined in Codec.Picture.Types

Methods

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

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

Eq QRPngDataUrl Source # 
Instance details

Defined in LndClient.QRCode

Eq WireValue 
Instance details

Defined in Data.ProtoLens.Encoding.Wire

Methods

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

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

Eq StreamingType 
Instance details

Defined in Data.ProtoLens.Service.Types

Methods

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

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

Eq WalletBalanceResponse'AccountBalanceEntry Source # 
Instance details

Defined in Proto.LndGrpc

Eq WalletBalanceResponse Source # 
Instance details

Defined in Proto.LndGrpc

Eq WalletBalanceRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq WalletAccountBalance Source # 
Instance details

Defined in Proto.LndGrpc

Eq VerifyMessageResponse Source # 
Instance details

Defined in Proto.LndGrpc

Eq VerifyMessageRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq VerifyChanBackupResponse Source # 
Instance details

Defined in Proto.LndGrpc

Eq Utxo Source # 
Instance details

Defined in Proto.LndGrpc

Methods

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

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

Eq TransactionDetails Source # 
Instance details

Defined in Proto.LndGrpc

Eq Transaction Source # 
Instance details

Defined in Proto.LndGrpc

Eq TimestampedError Source # 
Instance details

Defined in Proto.LndGrpc

Eq StopResponse Source # 
Instance details

Defined in Proto.LndGrpc

Eq StopRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq SignMessageResponse Source # 
Instance details

Defined in Proto.LndGrpc

Eq SignMessageRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq SendToRouteRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq SendResponse Source # 
Instance details

Defined in Proto.LndGrpc

Eq SendRequest'DestCustomRecordsEntry Source # 
Instance details

Defined in Proto.LndGrpc

Eq SendRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq SendManyResponse Source # 
Instance details

Defined in Proto.LndGrpc

Eq SendManyRequest'AddrToAmountEntry Source # 
Instance details

Defined in Proto.LndGrpc

Eq SendManyRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq SendCoinsResponse Source # 
Instance details

Defined in Proto.LndGrpc

Eq SendCoinsRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq RoutingPolicy Source # 
Instance details

Defined in Proto.LndGrpc

Eq RouteHint Source # 
Instance details

Defined in Proto.LndGrpc

Eq Route Source # 
Instance details

Defined in Proto.LndGrpc

Methods

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

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

Eq RestoreChanBackupRequest'Backup Source # 
Instance details

Defined in Proto.LndGrpc

Eq RestoreChanBackupRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq RestoreBackupResponse Source # 
Instance details

Defined in Proto.LndGrpc

Eq ResolutionType Source # 
Instance details

Defined in Proto.LndGrpc

Eq ResolutionType'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Eq ResolutionOutcome Source # 
Instance details

Defined in Proto.LndGrpc

Eq ResolutionOutcome'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Eq Resolution Source # 
Instance details

Defined in Proto.LndGrpc

Eq ReadyForPsbtFunding Source # 
Instance details

Defined in Proto.LndGrpc

Eq QueryRoutesResponse Source # 
Instance details

Defined in Proto.LndGrpc

Eq QueryRoutesRequest'DestCustomRecordsEntry Source # 
Instance details

Defined in Proto.LndGrpc

Eq QueryRoutesRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq PsbtShim Source # 
Instance details

Defined in Proto.LndGrpc

Eq PolicyUpdateResponse Source # 
Instance details

Defined in Proto.LndGrpc

Eq PolicyUpdateRequest'Scope Source # 
Instance details

Defined in Proto.LndGrpc

Eq PolicyUpdateRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq PendingUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Eq PendingHTLC Source # 
Instance details

Defined in Proto.LndGrpc

Eq PendingChannelsResponse'WaitingCloseChannel Source # 
Instance details

Defined in Proto.LndGrpc

Eq PendingChannelsResponse'PendingOpenChannel Source # 
Instance details

Defined in Proto.LndGrpc

Eq PendingChannelsResponse'PendingChannel Source # 
Instance details

Defined in Proto.LndGrpc

Eq PendingChannelsResponse'ForceClosedChannel'AnchorState Source # 
Instance details

Defined in Proto.LndGrpc

Eq PendingChannelsResponse'ForceClosedChannel'AnchorState'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Eq PendingChannelsResponse'ForceClosedChannel Source # 
Instance details

Defined in Proto.LndGrpc

Eq PendingChannelsResponse'Commitments Source # 
Instance details

Defined in Proto.LndGrpc

Eq PendingChannelsResponse'ClosedChannel Source # 
Instance details

Defined in Proto.LndGrpc

Eq PendingChannelsResponse Source # 
Instance details

Defined in Proto.LndGrpc

Eq PendingChannelsRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq PeerEventSubscription Source # 
Instance details

Defined in Proto.LndGrpc

Eq PeerEvent'EventType Source # 
Instance details

Defined in Proto.LndGrpc

Eq PeerEvent'EventType'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Eq PeerEvent Source # 
Instance details

Defined in Proto.LndGrpc

Eq Peer'SyncType Source # 
Instance details

Defined in Proto.LndGrpc

Eq Peer'SyncType'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Eq Peer'FeaturesEntry Source # 
Instance details

Defined in Proto.LndGrpc

Eq Peer Source # 
Instance details

Defined in Proto.LndGrpc

Methods

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

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

Eq PaymentHash Source # 
Instance details

Defined in Proto.LndGrpc

Eq PaymentFailureReason Source # 
Instance details

Defined in Proto.LndGrpc

Eq PaymentFailureReason'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Eq Payment'PaymentStatus Source # 
Instance details

Defined in Proto.LndGrpc

Eq Payment'PaymentStatus'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Eq Payment Source # 
Instance details

Defined in Proto.LndGrpc

Methods

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

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

Eq PayReqString Source # 
Instance details

Defined in Proto.LndGrpc

Eq PayReq'FeaturesEntry Source # 
Instance details

Defined in Proto.LndGrpc

Eq PayReq Source # 
Instance details

Defined in Proto.LndGrpc

Methods

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

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

Eq OutPoint Source # 
Instance details

Defined in Proto.LndGrpc

Eq OpenStatusUpdate'Update Source # 
Instance details

Defined in Proto.LndGrpc

Eq OpenStatusUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Eq OpenChannelRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq Op Source # 
Instance details

Defined in Proto.LndGrpc

Methods

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

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

Eq NodeUpdate'FeaturesEntry Source # 
Instance details

Defined in Proto.LndGrpc

Eq NodeUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Eq NodePair Source # 
Instance details

Defined in Proto.LndGrpc

Eq NodeMetricsResponse'BetweennessCentralityEntry Source # 
Instance details

Defined in Proto.LndGrpc

Eq NodeMetricsResponse Source # 
Instance details

Defined in Proto.LndGrpc

Eq NodeMetricsRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq NodeMetricType Source # 
Instance details

Defined in Proto.LndGrpc

Eq NodeMetricType'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Eq NodeInfoRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq NodeInfo Source # 
Instance details

Defined in Proto.LndGrpc

Eq NodeAddress Source # 
Instance details

Defined in Proto.LndGrpc

Eq NewAddressResponse Source # 
Instance details

Defined in Proto.LndGrpc

Eq NewAddressRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq NetworkInfoRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq NetworkInfo Source # 
Instance details

Defined in Proto.LndGrpc

Eq MultiChanBackup Source # 
Instance details

Defined in Proto.LndGrpc

Eq MacaroonPermissionList Source # 
Instance details

Defined in Proto.LndGrpc

Eq MacaroonPermission Source # 
Instance details

Defined in Proto.LndGrpc

Eq MacaroonId Source # 
Instance details

Defined in Proto.LndGrpc

Eq MPPRecord Source # 
Instance details

Defined in Proto.LndGrpc

Eq ListUnspentResponse Source # 
Instance details

Defined in Proto.LndGrpc

Eq ListUnspentRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq ListPermissionsResponse'MethodPermissionsEntry Source # 
Instance details

Defined in Proto.LndGrpc

Eq ListPermissionsResponse Source # 
Instance details

Defined in Proto.LndGrpc

Eq ListPermissionsRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq ListPeersResponse Source # 
Instance details

Defined in Proto.LndGrpc

Eq ListPeersRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq ListPaymentsResponse Source # 
Instance details

Defined in Proto.LndGrpc

Eq ListPaymentsRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq ListMacaroonIDsResponse Source # 
Instance details

Defined in Proto.LndGrpc

Eq ListMacaroonIDsRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq ListInvoiceResponse Source # 
Instance details

Defined in Proto.LndGrpc

Eq ListInvoiceRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq ListChannelsResponse Source # 
Instance details

Defined in Proto.LndGrpc

Eq ListChannelsRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq LightningNode'FeaturesEntry Source # 
Instance details

Defined in Proto.LndGrpc

Eq LightningNode Source # 
Instance details

Defined in Proto.LndGrpc

Eq LightningAddress Source # 
Instance details

Defined in Proto.LndGrpc

Eq KeyLocator Source # 
Instance details

Defined in Proto.LndGrpc

Eq KeyDescriptor Source # 
Instance details

Defined in Proto.LndGrpc

Eq InvoiceSubscription Source # 
Instance details

Defined in Proto.LndGrpc

Eq InvoiceHTLCState Source # 
Instance details

Defined in Proto.LndGrpc

Eq InvoiceHTLCState'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Eq InvoiceHTLC'CustomRecordsEntry Source # 
Instance details

Defined in Proto.LndGrpc

Eq InvoiceHTLC Source # 
Instance details

Defined in Proto.LndGrpc

Eq Invoice'InvoiceState Source # 
Instance details

Defined in Proto.LndGrpc

Eq Invoice'InvoiceState'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Eq Invoice'FeaturesEntry Source # 
Instance details

Defined in Proto.LndGrpc

Eq Invoice Source # 
Instance details

Defined in Proto.LndGrpc

Methods

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

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

Eq Initiator Source # 
Instance details

Defined in Proto.LndGrpc

Eq Initiator'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Eq HopHint Source # 
Instance details

Defined in Proto.LndGrpc

Methods

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

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

Eq Hop'CustomRecordsEntry Source # 
Instance details

Defined in Proto.LndGrpc

Eq Hop Source # 
Instance details

Defined in Proto.LndGrpc

Methods

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

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

Eq HTLCAttempt'HTLCStatus Source # 
Instance details

Defined in Proto.LndGrpc

Eq HTLCAttempt'HTLCStatus'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Eq HTLCAttempt Source # 
Instance details

Defined in Proto.LndGrpc

Eq HTLC Source # 
Instance details

Defined in Proto.LndGrpc

Methods

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

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

Eq GraphTopologyUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Eq GraphTopologySubscription Source # 
Instance details

Defined in Proto.LndGrpc

Eq GetTransactionsRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq GetRecoveryInfoResponse Source # 
Instance details

Defined in Proto.LndGrpc

Eq GetRecoveryInfoRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq GetInfoResponse'FeaturesEntry Source # 
Instance details

Defined in Proto.LndGrpc

Eq GetInfoResponse Source # 
Instance details

Defined in Proto.LndGrpc

Eq GetInfoRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq FundingTransitionMsg'Trigger Source # 
Instance details

Defined in Proto.LndGrpc

Eq FundingTransitionMsg Source # 
Instance details

Defined in Proto.LndGrpc

Eq FundingStateStepResp Source # 
Instance details

Defined in Proto.LndGrpc

Eq FundingShimCancel Source # 
Instance details

Defined in Proto.LndGrpc

Eq FundingShim'Shim Source # 
Instance details

Defined in Proto.LndGrpc

Eq FundingShim Source # 
Instance details

Defined in Proto.LndGrpc

Eq FundingPsbtVerify Source # 
Instance details

Defined in Proto.LndGrpc

Eq FundingPsbtFinalize Source # 
Instance details

Defined in Proto.LndGrpc

Eq ForwardingHistoryResponse Source # 
Instance details

Defined in Proto.LndGrpc

Eq ForwardingHistoryRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq ForwardingEvent Source # 
Instance details

Defined in Proto.LndGrpc

Eq FloatMetric Source # 
Instance details

Defined in Proto.LndGrpc

Eq FeeReportResponse Source # 
Instance details

Defined in Proto.LndGrpc

Eq FeeReportRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq FeeLimit'Limit Source # 
Instance details

Defined in Proto.LndGrpc

Eq FeeLimit Source # 
Instance details

Defined in Proto.LndGrpc

Eq FeatureBit Source # 
Instance details

Defined in Proto.LndGrpc

Eq FeatureBit'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Eq Feature Source # 
Instance details

Defined in Proto.LndGrpc

Methods

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

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

Eq Failure'FailureCode Source # 
Instance details

Defined in Proto.LndGrpc

Eq Failure'FailureCode'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Eq Failure Source # 
Instance details

Defined in Proto.LndGrpc

Methods

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

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

Eq ExportChannelBackupRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq EstimateFeeResponse Source # 
Instance details

Defined in Proto.LndGrpc

Eq EstimateFeeRequest'AddrToAmountEntry Source # 
Instance details

Defined in Proto.LndGrpc

Eq EstimateFeeRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq EdgeLocator Source # 
Instance details

Defined in Proto.LndGrpc

Eq DisconnectPeerResponse Source # 
Instance details

Defined in Proto.LndGrpc

Eq DisconnectPeerRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq DeleteMacaroonIDResponse Source # 
Instance details

Defined in Proto.LndGrpc

Eq DeleteMacaroonIDRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq DeleteAllPaymentsResponse Source # 
Instance details

Defined in Proto.LndGrpc

Eq DeleteAllPaymentsRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq DebugLevelResponse Source # 
Instance details

Defined in Proto.LndGrpc

Eq DebugLevelRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq ConnectPeerResponse Source # 
Instance details

Defined in Proto.LndGrpc

Eq ConnectPeerRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq ConfirmationUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Eq CommitmentType Source # 
Instance details

Defined in Proto.LndGrpc

Eq CommitmentType'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Eq ClosedChannelsResponse Source # 
Instance details

Defined in Proto.LndGrpc

Eq ClosedChannelsRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq ClosedChannelUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Eq CloseStatusUpdate'Update Source # 
Instance details

Defined in Proto.LndGrpc

Eq CloseStatusUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Eq CloseChannelRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq ChannelUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Eq ChannelPoint'FundingTxid Source # 
Instance details

Defined in Proto.LndGrpc

Eq ChannelPoint Source # 
Instance details

Defined in Proto.LndGrpc

Eq ChannelOpenUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Eq ChannelGraphRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq ChannelGraph Source # 
Instance details

Defined in Proto.LndGrpc

Eq ChannelFeeReport Source # 
Instance details

Defined in Proto.LndGrpc

Eq ChannelEventUpdate'UpdateType Source # 
Instance details

Defined in Proto.LndGrpc

Eq ChannelEventUpdate'UpdateType'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Eq ChannelEventUpdate'Channel Source # 
Instance details

Defined in Proto.LndGrpc

Eq ChannelEventUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Eq ChannelEventSubscription Source # 
Instance details

Defined in Proto.LndGrpc

Eq ChannelEdgeUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Eq ChannelEdge Source # 
Instance details

Defined in Proto.LndGrpc

Eq ChannelConstraints Source # 
Instance details

Defined in Proto.LndGrpc

Eq ChannelCloseUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Eq ChannelCloseSummary'ClosureType Source # 
Instance details

Defined in Proto.LndGrpc

Eq ChannelCloseSummary'ClosureType'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Eq ChannelCloseSummary Source # 
Instance details

Defined in Proto.LndGrpc

Eq ChannelBalanceResponse Source # 
Instance details

Defined in Proto.LndGrpc

Eq ChannelBalanceRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq ChannelBackups Source # 
Instance details

Defined in Proto.LndGrpc

Eq ChannelBackupSubscription Source # 
Instance details

Defined in Proto.LndGrpc

Eq ChannelBackup Source # 
Instance details

Defined in Proto.LndGrpc

Eq ChannelAcceptResponse Source # 
Instance details

Defined in Proto.LndGrpc

Eq ChannelAcceptRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq Channel Source # 
Instance details

Defined in Proto.LndGrpc

Methods

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

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

Eq ChanPointShim Source # 
Instance details

Defined in Proto.LndGrpc

Eq ChanInfoRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq ChanBackupSnapshot Source # 
Instance details

Defined in Proto.LndGrpc

Eq ChanBackupExportRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq Chain Source # 
Instance details

Defined in Proto.LndGrpc

Methods

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

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

Eq BakeMacaroonResponse Source # 
Instance details

Defined in Proto.LndGrpc

Eq BakeMacaroonRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq Amount Source # 
Instance details

Defined in Proto.LndGrpc

Methods

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

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

Eq AddressType Source # 
Instance details

Defined in Proto.LndGrpc

Eq AddressType'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Eq AddInvoiceResponse Source # 
Instance details

Defined in Proto.LndGrpc

Eq AbandonChannelResponse Source # 
Instance details

Defined in Proto.LndGrpc

Eq AbandonChannelRequest Source # 
Instance details

Defined in Proto.LndGrpc

Eq AMPRecord Source # 
Instance details

Defined in Proto.LndGrpc

Eq AMP Source # 
Instance details

Defined in Proto.LndGrpc

Methods

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

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

Eq SubscribeSingleInvoiceRequest Source # 
Instance details

Defined in Proto.InvoiceGrpc

Eq SettleInvoiceResp Source # 
Instance details

Defined in Proto.InvoiceGrpc

Eq SettleInvoiceMsg Source # 
Instance details

Defined in Proto.InvoiceGrpc

Eq CancelInvoiceResp Source # 
Instance details

Defined in Proto.InvoiceGrpc

Eq CancelInvoiceMsg Source # 
Instance details

Defined in Proto.InvoiceGrpc

Eq AddHoldInvoiceResp Source # 
Instance details

Defined in Proto.InvoiceGrpc

Eq AddHoldInvoiceRequest Source # 
Instance details

Defined in Proto.InvoiceGrpc

Eq Encoding 
Instance details

Defined in Basement.String

Methods

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

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

Eq String 
Instance details

Defined in Basement.UTF8.Base

Methods

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

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

Eq ASCII7_Invalid 
Instance details

Defined in Basement.String.Encoding.ASCII7

Methods

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

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

Eq ISO_8859_1_Invalid 
Instance details

Defined in Basement.String.Encoding.ISO_8859_1

Methods

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

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

Eq UTF16_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF16

Methods

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

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

Eq UTF32_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF32

Methods

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

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

Eq FileSize 
Instance details

Defined in Basement.Types.OffsetSize

Methods

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

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

Eq CryptoError 
Instance details

Defined in Crypto.Error.Types

Methods

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

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

Eq GrpcTimeoutSeconds Source # 
Instance details

Defined in LndClient.Data.Newtype

Eq Seconds Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

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

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

Eq AezeedPassphrase Source # 
Instance details

Defined in LndClient.Data.Newtype

Eq CipherSeedMnemonic Source # 
Instance details

Defined in LndClient.Data.Newtype

Eq Sat Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

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

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

Eq MSat Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

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

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

Eq RPreimage Source # 
Instance details

Defined in LndClient.Data.Newtype

Eq RHash Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

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

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

Eq PaymentRequest Source # 
Instance details

Defined in LndClient.Data.Newtype

Eq SettleIndex Source # 
Instance details

Defined in LndClient.Data.Newtype

Eq AddIndex Source # 
Instance details

Defined in LndClient.Data.Newtype

Eq NodeLocation Source # 
Instance details

Defined in LndClient.Data.Newtype

Eq NodePubKey Source # 
Instance details

Defined in LndClient.Data.Newtype

Eq PEM 
Instance details

Defined in Data.PEM.Types

Methods

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

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

Eq ASN1CharacterString 
Instance details

Defined in Data.ASN1.Types.String

Methods

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

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

Eq HashALG 
Instance details

Defined in Data.X509.AlgorithmIdentifier

Methods

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

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

Eq PubKeyALG 
Instance details

Defined in Data.X509.AlgorithmIdentifier

Methods

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

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

Eq SignatureALG 
Instance details

Defined in Data.X509.AlgorithmIdentifier

Methods

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

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

Eq CRL 
Instance details

Defined in Data.X509.CRL

Methods

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

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

Eq RevokedCertificate 
Instance details

Defined in Data.X509.CRL

Methods

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

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

Eq Certificate 
Instance details

Defined in Data.X509.Cert

Methods

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

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

Eq CertificateChain 
Instance details

Defined in Data.X509.CertificateChain

Methods

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

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

Eq CertificateChainRaw 
Instance details

Defined in Data.X509.CertificateChain

Methods

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

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

Eq DistinguishedName 
Instance details

Defined in Data.X509.DistinguishedName

Methods

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

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

Eq DnElement 
Instance details

Defined in Data.X509.DistinguishedName

Methods

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

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

Eq AltName 
Instance details

Defined in Data.X509.Ext

Methods

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

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

Eq DistributionPoint 
Instance details

Defined in Data.X509.Ext

Methods

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

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

Eq ExtAuthorityKeyId 
Instance details

Defined in Data.X509.Ext

Methods

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

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

Eq ExtBasicConstraints 
Instance details

Defined in Data.X509.Ext

Methods

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

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

Eq ExtCrlDistributionPoints 
Instance details

Defined in Data.X509.Ext

Methods

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

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

Eq ExtExtendedKeyUsage 
Instance details

Defined in Data.X509.Ext

Methods

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

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

Eq ExtKeyUsage 
Instance details

Defined in Data.X509.Ext

Methods

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

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

Eq ExtKeyUsageFlag 
Instance details

Defined in Data.X509.Ext

Methods

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

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

Eq ExtKeyUsagePurpose 
Instance details

Defined in Data.X509.Ext

Methods

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

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

Eq ExtNetscapeComment 
Instance details

Defined in Data.X509.Ext

Methods

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

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

Eq ExtSubjectAltName 
Instance details

Defined in Data.X509.Ext

Methods

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

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

Eq ExtSubjectKeyId 
Instance details

Defined in Data.X509.Ext

Methods

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

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

Eq ReasonFlag 
Instance details

Defined in Data.X509.Ext

Methods

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

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

Eq ExtensionRaw 
Instance details

Defined in Data.X509.ExtensionRaw

Methods

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

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

Eq Extensions 
Instance details

Defined in Data.X509.ExtensionRaw

Methods

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

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

Eq PrivKey 
Instance details

Defined in Data.X509.PrivateKey

Methods

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

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

Eq PrivKeyEC 
Instance details

Defined in Data.X509.PrivateKey

Methods

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

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

Eq PubKey 
Instance details

Defined in Data.X509.PublicKey

Methods

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

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

Eq PubKeyEC 
Instance details

Defined in Data.X509.PublicKey

Methods

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

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

Eq SerializedPoint 
Instance details

Defined in Data.X509.PublicKey

Methods

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

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

Eq ASN1 
Instance details

Defined in Data.ASN1.Types

Methods

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

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

Eq Error 
Instance details

Defined in Env.Internal.Error

Methods

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

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

Eq PortNumber 
Instance details

Defined in Network.Socket.Types

Methods

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

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

Eq FrameHeader 
Instance details

Defined in Network.HTTP2.Types

Methods

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

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

Eq FramePayload 
Instance details

Defined in Network.HTTP2.Types

Methods

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

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

Eq Supported 
Instance details

Defined in Network.TLS.Parameters

Methods

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

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

Eq GroupUsage 
Instance details

Defined in Network.TLS.Parameters

Methods

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

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

Eq HTTP2Error 
Instance details

Defined in Network.HTTP2.Types

Methods

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

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

Eq ErrorCodeId 
Instance details

Defined in Network.HTTP2.Types

Methods

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

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

Eq Priority 
Instance details

Defined in Network.HTTP2.Types

Methods

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

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

Eq AddrInfo 
Instance details

Defined in Network.Socket

Methods

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

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

Eq AddrInfoFlag 
Instance details

Defined in Network.Socket

Methods

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

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

Eq NameInfoFlag 
Instance details

Defined in Network.Socket

Methods

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

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

Eq Family 
Instance details

Defined in Network.Socket.Types

Methods

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

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

Eq SockAddr 
Instance details

Defined in Network.Socket.Types

Methods

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

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

Eq Socket 
Instance details

Defined in Network.Socket.Types

Methods

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

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

Eq SocketStatus 
Instance details

Defined in Network.Socket.Types

Methods

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

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

Eq SocketType 
Instance details

Defined in Network.Socket.Types

Methods

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

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

Eq SharedSecret 
Instance details

Defined in Crypto.ECC

Methods

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

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

Eq RawConfig Source # 
Instance details

Defined in LndClient.Data.LndEnv

Eq LndPort Source # 
Instance details

Defined in LndClient.Data.LndEnv

Methods

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

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

Eq LndHost Source # 
Instance details

Defined in LndClient.Data.LndEnv

Methods

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

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

Eq LndHexMacaroon Source # 
Instance details

Defined in LndClient.Data.LndEnv

Eq LndTlsCert Source # 
Instance details

Defined in LndClient.Data.LndEnv

Eq LndWalletPassword Source # 
Instance details

Defined in LndClient.Data.LndEnv

Eq GRPCStatus 
Instance details

Defined in Network.GRPC.HTTP2.Types

Methods

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

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

Eq GRPCStatusCode 
Instance details

Defined in Network.GRPC.HTTP2.Types

Methods

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

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

Eq InvalidGRPCStatus 
Instance details

Defined in Network.GRPC.HTTP2.Types

Methods

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

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

Eq EncodeStrategy 
Instance details

Defined in Network.HPACK.Types

Methods

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

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

Eq ASN1ConstructionType 
Instance details

Defined in Data.ASN1.Types

Methods

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

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

Eq CertKeyUsage 
Instance details

Defined in Data.X509.Cert

Methods

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

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

Eq ASN1TimeType 
Instance details

Defined in Data.ASN1.Types

Methods

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

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

Eq ASN1StringEncoding 
Instance details

Defined in Data.ASN1.Types.String

Methods

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

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

Eq Frame 
Instance details

Defined in Network.HTTP2.Types

Methods

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

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

Eq FrameTypeId 
Instance details

Defined in Network.HTTP2.Types

Methods

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

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

Eq SettingsKeyId 
Instance details

Defined in Network.HTTP2.Types

Methods

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

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

Eq CompressionAlgo 
Instance details

Defined in Network.HPACK.Types

Methods

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

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

Eq DecodeError 
Instance details

Defined in Network.HPACK.Types

Methods

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

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

Eq HIndex 
Instance details

Defined in Network.HPACK.Types

Methods

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

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

Eq SubscribeInvoicesRequest Source # 
Instance details

Defined in LndClient.Data.SubscribeInvoices

Eq SendPaymentResponse Source # 
Instance details

Defined in LndClient.Data.SendPayment

Eq SendPaymentRequest Source # 
Instance details

Defined in LndClient.Data.SendPayment

Eq ConnectPeerRequest Source # 
Instance details

Defined in LndClient.Data.Peer

Eq LightningAddress Source # 
Instance details

Defined in LndClient.Data.Peer

Eq Peer Source # 
Instance details

Defined in LndClient.Data.Peer

Methods

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

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

Eq Payment Source # 
Instance details

Defined in LndClient.Data.Payment

Methods

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

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

Eq PayReq Source # 
Instance details

Defined in LndClient.Data.PayReq

Methods

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

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

Eq AddHodlInvoiceRequest Source # 
Instance details

Defined in LndClient.Data.AddHodlInvoice

Eq NewAddressResponse Source # 
Instance details

Defined in LndClient.Data.NewAddress

Eq AddressType Source # 
Instance details

Defined in LndClient.Data.NewAddress

Eq NewAddressRequest Source # 
Instance details

Defined in LndClient.Data.NewAddress

Eq InvoiceState Source # 
Instance details

Defined in LndClient.Data.Invoice

Eq Invoice Source # 
Instance details

Defined in LndClient.Data.Invoice

Methods

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

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

Eq GetInfoResponse Source # 
Instance details

Defined in LndClient.Data.GetInfo

Eq ClosedChannelsRequest Source # 
Instance details

Defined in LndClient.Data.ClosedChannels

Eq ChannelPoint Source # 
Instance details

Defined in LndClient.Data.ChannelPoint

Eq PendingChannel Source # 
Instance details

Defined in LndClient.Data.PendingChannel

Eq WaitingCloseChannel Source # 
Instance details

Defined in LndClient.Data.WaitingCloseChannel

Eq PendingOpenChannel Source # 
Instance details

Defined in LndClient.Data.PendingOpenChannel

Eq ForceClosedChannel Source # 
Instance details

Defined in LndClient.Data.ForceClosedChannel

Eq ClosedChannel Source # 
Instance details

Defined in LndClient.Data.ClosedChannel

Eq PendingChannelsResponse Source # 
Instance details

Defined in LndClient.Data.PendingChannels

Eq Channel Source # 
Instance details

Defined in LndClient.Data.Channel

Methods

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

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

Eq OpenStatusUpdate Source # 
Instance details

Defined in LndClient.Data.OpenChannel

Eq OpenChannelRequest Source # 
Instance details

Defined in LndClient.Data.OpenChannel

Eq ChannelCloseSummary Source # 
Instance details

Defined in LndClient.Data.CloseChannel

Eq ChannelCloseUpdate Source # 
Instance details

Defined in LndClient.Data.CloseChannel

Eq CloseStatusUpdate Source # 
Instance details

Defined in LndClient.Data.CloseChannel

Eq CloseChannelRequest Source # 
Instance details

Defined in LndClient.Data.CloseChannel

Eq UpdateChannel Source # 
Instance details

Defined in LndClient.Data.SubscribeChannelEvents

Eq ChannelEventUpdate Source # 
Instance details

Defined in LndClient.Data.SubscribeChannelEvents

Eq AddInvoiceResponse Source # 
Instance details

Defined in LndClient.Data.AddInvoice

Eq AddInvoiceRequest Source # 
Instance details

Defined in LndClient.Data.AddInvoice

Eq XImportMissionControlResponse Source # 
Instance details

Defined in Proto.RouterGrpc

Eq XImportMissionControlRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Eq UpdateChanStatusResponse Source # 
Instance details

Defined in Proto.RouterGrpc

Eq UpdateChanStatusRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Eq TrackPaymentRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Eq SubscribeHtlcEventsRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Eq SettleEvent Source # 
Instance details

Defined in Proto.RouterGrpc

Eq SetMissionControlConfigResponse Source # 
Instance details

Defined in Proto.RouterGrpc

Eq SetMissionControlConfigRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Eq SendToRouteResponse Source # 
Instance details

Defined in Proto.RouterGrpc

Eq SendToRouteRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Eq SendPaymentRequest'DestCustomRecordsEntry Source # 
Instance details

Defined in Proto.RouterGrpc

Eq SendPaymentRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Eq RouteFeeResponse Source # 
Instance details

Defined in Proto.RouterGrpc

Eq RouteFeeRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Eq ResolveHoldForwardAction Source # 
Instance details

Defined in Proto.RouterGrpc

Eq ResolveHoldForwardAction'UnrecognizedValue Source # 
Instance details

Defined in Proto.RouterGrpc

Eq ResetMissionControlResponse Source # 
Instance details

Defined in Proto.RouterGrpc

Eq ResetMissionControlRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Eq QueryProbabilityResponse Source # 
Instance details

Defined in Proto.RouterGrpc

Eq QueryProbabilityRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Eq QueryMissionControlResponse Source # 
Instance details

Defined in Proto.RouterGrpc

Eq QueryMissionControlRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Eq PaymentStatus Source # 
Instance details

Defined in Proto.RouterGrpc

Eq PaymentState Source # 
Instance details

Defined in Proto.RouterGrpc

Eq PaymentState'UnrecognizedValue Source # 
Instance details

Defined in Proto.RouterGrpc

Eq PairHistory Source # 
Instance details

Defined in Proto.RouterGrpc

Eq PairData Source # 
Instance details

Defined in Proto.RouterGrpc

Eq MissionControlConfig Source # 
Instance details

Defined in Proto.RouterGrpc

Eq LinkFailEvent Source # 
Instance details

Defined in Proto.RouterGrpc

Eq HtlcInfo Source # 
Instance details

Defined in Proto.RouterGrpc

Eq HtlcEvent'EventType Source # 
Instance details

Defined in Proto.RouterGrpc

Eq HtlcEvent'EventType'UnrecognizedValue Source # 
Instance details

Defined in Proto.RouterGrpc

Eq HtlcEvent'Event Source # 
Instance details

Defined in Proto.RouterGrpc

Eq HtlcEvent Source # 
Instance details

Defined in Proto.RouterGrpc

Eq GetMissionControlConfigResponse Source # 
Instance details

Defined in Proto.RouterGrpc

Eq GetMissionControlConfigRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Eq ForwardHtlcInterceptResponse Source # 
Instance details

Defined in Proto.RouterGrpc

Eq ForwardHtlcInterceptRequest'CustomRecordsEntry Source # 
Instance details

Defined in Proto.RouterGrpc

Eq ForwardHtlcInterceptRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Eq ForwardFailEvent Source # 
Instance details

Defined in Proto.RouterGrpc

Eq ForwardEvent Source # 
Instance details

Defined in Proto.RouterGrpc

Eq FailureDetail Source # 
Instance details

Defined in Proto.RouterGrpc

Eq FailureDetail'UnrecognizedValue Source # 
Instance details

Defined in Proto.RouterGrpc

Eq CircuitKey Source # 
Instance details

Defined in Proto.RouterGrpc

Eq ChanStatusAction Source # 
Instance details

Defined in Proto.RouterGrpc

Eq ChanStatusAction'UnrecognizedValue Source # 
Instance details

Defined in Proto.RouterGrpc

Eq BuildRouteResponse Source # 
Instance details

Defined in Proto.RouterGrpc

Eq BuildRouteRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Eq TrackPaymentRequest Source # 
Instance details

Defined in LndClient.Data.TrackPayment

Eq HtlcEvent Source # 
Instance details

Defined in LndClient.Data.HtlcEvent

Eq UnlockWalletResponse Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Eq UnlockWalletRequest Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Eq InitWalletResponse Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Eq InitWalletRequest Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Eq GenSeedResponse Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Eq GenSeedRequest Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Eq ChangePasswordResponse Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Eq ChangePasswordRequest Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Eq UnlockWalletRequest Source # 
Instance details

Defined in LndClient.Data.UnlockWallet

Eq InitWalletRequest Source # 
Instance details

Defined in LndClient.Data.InitWallet

Eq Block 
Instance details

Defined in Network.Bitcoin.BlockChain

Methods

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

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

Eq OutputInfo 
Instance details

Defined in Network.Bitcoin.BlockChain

Methods

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

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

Eq OutputSetInfo 
Instance details

Defined in Network.Bitcoin.BlockChain

Methods

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

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

Eq BlockTemplate 
Instance details

Defined in Network.Bitcoin.Mining

Methods

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

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

Eq CoinBaseAux 
Instance details

Defined in Network.Bitcoin.Mining

Methods

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

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

Eq HashData 
Instance details

Defined in Network.Bitcoin.Mining

Methods

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

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

Eq MiningInfo 
Instance details

Defined in Network.Bitcoin.Mining

Methods

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

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

Eq Transaction 
Instance details

Defined in Network.Bitcoin.Mining

Methods

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

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

Eq BitcoinException 
Instance details

Defined in Network.Bitcoin.Types

Methods

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

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

Eq URIAuth 
Instance details

Defined in Network.URI

Methods

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

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

Eq CookieJar 
Instance details

Defined in Network.HTTP.Client.Types

Methods

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

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

Eq ResponseClose 
Instance details

Defined in Network.HTTP.Client.Types

Methods

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

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

Eq Proxy 
Instance details

Defined in Network.HTTP.Client.Types

Methods

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

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

Eq Cookie 
Instance details

Defined in Network.HTTP.Client.Types

Methods

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

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

Eq URI 
Instance details

Defined in Network.URI

Methods

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

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

Eq StreamFileStatus 
Instance details

Defined in Network.HTTP.Client.Types

Methods

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

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

Eq ResponseTimeout 
Instance details

Defined in Network.HTTP.Client.Types

Methods

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

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

Eq ConnHost 
Instance details

Defined in Network.HTTP.Client.Types

Methods

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

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

Eq ConnKey 
Instance details

Defined in Network.HTTP.Client.Types

Methods

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

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

Eq StatusHeaders 
Instance details

Defined in Network.HTTP.Client.Types

Methods

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

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

Eq BitcoinRpcError 
Instance details

Defined in Network.Bitcoin.Internal

Methods

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

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

Eq DistinguishedNameInner 
Instance details

Defined in Data.X509.DistinguishedName

Methods

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

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

Eq a => Eq [a] 
Instance details

Defined in GHC.Classes

Methods

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

(/=) :: [a] -> [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 (Ratio a)

Since: base-2.1

Instance details

Defined in GHC.Real

Methods

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

(/=) :: Ratio a -> Ratio 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 (FunPtr a) 
Instance details

Defined in GHC.Ptr

Methods

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

(/=) :: FunPtr a -> FunPtr 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 (ForeignPtr a)

Since: base-2.1

Instance details

Defined in GHC.ForeignPtr

Methods

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

(/=) :: ForeignPtr a -> ForeignPtr 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 (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 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 (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 m => Eq (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Eq a => Eq (Option a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

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

(/=) :: Option a -> Option 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 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 (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 (IORef a)

^ Pointer equality.

Since: base-4.1.0.0

Instance details

Defined in GHC.IORef

Methods

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

(/=) :: IORef a -> IORef 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 (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 (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 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 (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 (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 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 (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

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

(/=) :: IntMap a -> IntMap 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 (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 (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

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

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

Eq a => Eq (AnnotDetails a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

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

Defined in Control.Concurrent.STM.TChan

Methods

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

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

Eq a => Eq (MeridiemLocale a) 
Instance details

Defined in Chronos

Methods

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

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

Eq a => Eq (Vector a) 
Instance details

Defined in Data.Vector

Methods

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

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

Eq (Encoding' a) 
Instance details

Defined in Data.Aeson.Encoding.Internal

Methods

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

(/=) :: Encoding' a -> Encoding' 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 #

Eq (Async a) 
Instance details

Defined in Control.Concurrent.Async

Methods

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

(/=) :: Async a -> Async 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 a => Eq (IResult a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

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

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

(Eq (Key record), Eq record) => Eq (Entity record) 
Instance details

Defined in Database.Persist.Class.PersistEntity

Methods

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

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

Eq a => Eq (Item a) 
Instance details

Defined in Katip.Core

Methods

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

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

Eq a => Eq (HashSet a) 
Instance details

Defined in Data.HashSet.Base

Methods

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

(/=) :: HashSet a -> HashSet a -> 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 a => Eq (DList a) 
Instance details

Defined in Data.DList

Methods

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

(/=) :: DList a -> DList 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 (Array a) 
Instance details

Defined in Data.Primitive.Array

Methods

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

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

(Eq a, Prim a) => Eq (PrimArray a) 
Instance details

Defined in Data.Primitive.PrimArray

Methods

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

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

Eq a => Eq (SmallArray a) 
Instance details

Defined in Data.Primitive.SmallArray

Methods

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

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

(Eq a, PrimUnlifted a) => Eq (UnliftedArray a) 
Instance details

Defined in Data.Primitive.UnliftedArray

Methods

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

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

Eq a => Eq (Hashed a) 
Instance details

Defined in Data.Hashable.Class

Methods

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

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

(Eq (PixelBaseComponent a), Storable (PixelBaseComponent a)) => Eq (Image a) 
Instance details

Defined in Codec.Picture.Types

Methods

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

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

Eq a => Eq (Result a) 
Instance details

Defined in Codec.QRCode.Data.Result

Methods

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

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

Eq s => Eq (CI s) 
Instance details

Defined in Data.CaseInsensitive.Internal

Methods

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

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

Eq a => Eq (CryptoFailable a) 
Instance details

Defined in Crypto.Error.Types

Methods

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

(/=) :: CryptoFailable a -> CryptoFailable a -> 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 (Offset ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

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

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

Eq (CountOf ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

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

(/=) :: CountOf ty -> CountOf ty -> 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 a => Eq (NonEmpty a) 
Instance details

Defined in Basement.NonEmpty

Methods

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

(/=) :: NonEmpty a -> NonEmpty a -> 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 (TxId a) Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

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

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

Eq (Vout a) Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

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

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

(Show a, Eq a, ASN1Object a) => Eq (Signed a) 
Instance details

Defined in Data.X509.Signed

Methods

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

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

(Show a, Eq a, ASN1Object a) => Eq (SignedExact a) 
Instance details

Defined in Data.X509.Signed

Methods

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

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

Eq (Digest a) 
Instance details

Defined in Crypto.Hash.Types

Methods

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

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

Eq (PendingUpdate a) Source # 
Instance details

Defined in LndClient.Data.Channel

Eq a => Eq (BitcoinRpcResponse a) 
Instance details

Defined in Network.Bitcoin.Internal

Methods

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

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

Eq body => Eq (Response body) 
Instance details

Defined in Network.HTTP.Client.Types

Methods

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

(/=) :: Response body -> Response body -> 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 (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 (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 (TypeRep a)

Since: base-2.1

Instance details

Defined in Data.Typeable.Internal

Methods

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

(/=) :: TypeRep a -> TypeRep a -> 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 (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 (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 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 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) 
Instance details

Defined in Data.HashMap.Base

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

Methods

(==) :: Leaf k v -> Leaf k v -> Bool #

(/=) :: Leaf k v -> Leaf k v -> 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 (SmallMutableArray s a) 
Instance details

Defined in Data.Primitive.SmallArray

Methods

(==) :: SmallMutableArray s a -> SmallMutableArray s a -> Bool #

(/=) :: SmallMutableArray s a -> SmallMutableArray s a -> Bool #

Eq (MutableUnliftedArray s a) 
Instance details

Defined in Data.Primitive.UnliftedArray

Methods

(==) :: MutableUnliftedArray s a -> MutableUnliftedArray s a -> Bool #

(/=) :: MutableUnliftedArray s a -> MutableUnliftedArray s a -> Bool #

Eq m => Eq (Mon m a) 
Instance details

Defined in Env.Internal.Free

Methods

(==) :: Mon m a -> Mon m a -> Bool #

(/=) :: Mon m a -> Mon m a -> 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 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 #

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 #

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

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

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

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

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
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 (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
Fractional Scientific 
Instance details

Defined in Data.Scientific

Methods

(/) :: Scientific -> Scientific -> Scientific #

recip :: Scientific -> Scientific #

fromRational :: Rational -> Scientific #

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 #

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

Since: base-2.1

Instance details

Defined in GHC.Word

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 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 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 CMode 
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 CSsize 
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 CNlink 
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 CTcflag 
Instance details

Defined in System.Posix.Types

Integral CRLim 
Instance details

Defined in System.Posix.Types

Integral CBlkSize 
Instance details

Defined in System.Posix.Types

Integral CBlkCnt 
Instance details

Defined in System.Posix.Types

Integral CClockId 
Instance details

Defined in System.Posix.Types

Integral CFsBlkCnt 
Instance details

Defined in System.Posix.Types

Integral CFsFilCnt 
Instance details

Defined in System.Posix.Types

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

Defined in Network.Socket.Types

Methods

quot :: PortNumber -> PortNumber -> PortNumber #

rem :: PortNumber -> PortNumber -> PortNumber #

div :: PortNumber -> PortNumber -> PortNumber #

mod :: PortNumber -> PortNumber -> PortNumber #

quotRem :: PortNumber -> PortNumber -> (PortNumber, PortNumber) #

divMod :: PortNumber -> PortNumber -> (PortNumber, PortNumber) #

toInteger :: PortNumber -> Integer #

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

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.

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

return :: a -> m a #

Inject a value into the monadic type.

Instances
Monad []

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

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

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

return :: a -> [a] #

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

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

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

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

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

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

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

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

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

fail :: String -> Last a #

Monad Option

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

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

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

return :: a -> Option a #

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

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

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

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

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

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

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

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

fail :: String -> Down a #

Monad ReadPrec

Since: base-2.1

Instance details

Defined in Text.ParserCombinators.ReadPrec

Methods

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

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

return :: a -> ReadPrec a #

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

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

fail :: String -> NonEmpty a #

Monad Get 
Instance details

Defined in Data.Binary.Get.Internal

Methods

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

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

return :: a -> Get a #

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

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

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

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

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

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

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

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

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

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

fail :: String -> IResult a #

Monad Box 
Instance details

Defined in Data.Vector.Fusion.Util

Methods

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

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

return :: a -> Box a #

fail :: String -> Box a #

Monad DList 
Instance details

Defined in Data.DList

Methods

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

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

return :: a -> DList a #

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

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

fail :: String -> SmallArray a #

Monad Parser 
Instance details

Defined in Data.ProtoLens.Encoding.Parser.Internal

Methods

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

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

return :: a -> Parser a #

fail :: String -> Parser a #

Monad Result 
Instance details

Defined in Codec.QRCode.Data.Result

Methods

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

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

return :: a -> Result a #

fail :: String -> Result a #

Monad CryptoFailable 
Instance details

Defined in Crypto.Error.Types

Methods

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

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

return :: a -> CryptoFailable a #

fail :: String -> CryptoFailable a #

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 #

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

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

fail :: String -> (a, a0) #

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 #

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

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

fail :: String -> ArrowMonad a a0 #

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 #

fail :: String -> Proxy a #

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 #

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

fail :: String -> MaybeT m a #

Monad m => Monad (KatipT m) 
Instance details

Defined in Katip.Core

Methods

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

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

return :: a -> KatipT m a #

fail :: String -> KatipT m a #

Monad m => Monad (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

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

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

return :: a -> KatipContextT m a #

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

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

fail :: String -> ResourceT m a #

Monad m => Monad (NoLoggingT m) 
Instance details

Defined in Katip.Monadic

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 #

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

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

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

fail :: String -> WriterLoggingT m a #

DRG gen => Monad (MonadPseudoRandom gen) 
Instance details

Defined in Crypto.Random.Types

Methods

(>>=) :: MonadPseudoRandom gen a -> (a -> MonadPseudoRandom gen b) -> MonadPseudoRandom gen b #

(>>) :: MonadPseudoRandom gen a -> MonadPseudoRandom gen b -> MonadPseudoRandom gen b #

return :: a -> MonadPseudoRandom gen a #

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

fail :: String -> Rec1 f a #

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 #

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

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

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

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

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

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

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

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

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

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

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

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

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

fail :: String -> Tagged s a #

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 #

fail :: String -> StateT s m a #

Monad ((->) r :: Type -> Type)

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 #

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

fail :: String -> (f :*: g) a #

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

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

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

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

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

fail :: String -> ConduitT i o m 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 #

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

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

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

fail :: String -> RWST r w s m 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 #

fail :: String -> Pipe l i o u 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 #

fail :: String -> Builder collection mutCollection step state err a #

class Functor (f :: Type -> Type) where #

The Functor class is used for types that can be mapped over. Instances of Functor should satisfy the following laws:

fmap id  ==  id
fmap (f . g)  ==  fmap f . fmap g

The instances of Functor for lists, Maybe and IO satisfy these laws.

Minimal complete definition

fmap

Methods

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

(<$) :: 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
Functor []

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

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

(<$) :: a -> [b] -> [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 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 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 Q 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

(<$) :: a -> Q b -> Q 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 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 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 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 Option

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

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

(<$) :: a -> Option b -> Option 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 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 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 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 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 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 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 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 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 ReadPrec

Since: base-2.1

Instance details

Defined in Text.ParserCombinators.ReadPrec

Methods

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

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

Defined in Data.Binary.Get.Internal

Methods

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

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

Functor Get 
Instance details

Defined in Data.Binary.Get.Internal

Methods

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

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

Defined in Data.IntMap.Internal

Methods

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

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

Functor Tree 
Instance details

Defined in Data.Tree

Methods

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

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

Functor Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

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

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

Functor FingerTree 
Instance details

Defined in Data.Sequence.Internal

Methods

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

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

Functor Digit 
Instance details

Defined in Data.Sequence.Internal

Methods

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

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

Functor Node 
Instance details

Defined in Data.Sequence.Internal

Methods

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

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

Functor Elem 
Instance details

Defined in Data.Sequence.Internal

Methods

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

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

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

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

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

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

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

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

Defined in Data.Vector

Methods

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

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

Defined in Data.Aeson.Types.FromJSON

Methods

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

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

Defined in Data.Vector.Fusion.Util

Methods

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

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

Defined in Data.Aeson.Types.Internal

Methods

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

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

Functor IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

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

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

Functor Item 
Instance details

Defined in Katip.Core

Methods

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

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

Functor Box 
Instance details

Defined in Data.Vector.Fusion.Util

Methods

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

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

Defined in Data.DList

Methods

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

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

Functor Array 
Instance details

Defined in Data.Primitive.Array

Methods

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

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

Defined in Data.Primitive.SmallArray

Methods

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

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

Functor Parser 
Instance details

Defined in Data.ProtoLens.Encoding.Parser.Internal

Methods

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

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

Functor Result 
Instance details

Defined in Codec.QRCode.Data.Result

Methods

fmap :: (a -> b) -> Result a -> Result b #

(<$) :: a -> Result b -> Result a #

Functor ParseResult 
Instance details

Defined in Data.ProtoLens.Encoding.Parser.Internal

Methods

fmap :: (a -> b) -> ParseResult a -> ParseResult b #

(<$) :: a -> ParseResult b -> ParseResult a #

Functor CryptoFailable 
Instance details

Defined in Crypto.Error.Types

Methods

fmap :: (a -> b) -> CryptoFailable a -> CryptoFailable b #

(<$) :: a -> CryptoFailable b -> CryptoFailable a #

Functor Response 
Instance details

Defined in Network.HTTP.Client.Types

Methods

fmap :: (a -> b) -> Response a -> Response b #

(<$) :: a -> Response b -> Response a #

Functor HistoriedResponse 
Instance details

Defined in Network.HTTP.Client

Methods

fmap :: (a -> b) -> HistoriedResponse a -> HistoriedResponse b #

(<$) :: a -> HistoriedResponse b -> HistoriedResponse 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 #

Functor (V1 :: Type -> 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 (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 ((,) a)

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

fmap :: (a0 -> b) -> (a, a0) -> (a, b) #

(<$) :: a0 -> (a, b) -> (a, a0) #

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 #

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 #

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 (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 (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 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 (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 m => Functor (KatipT m) 
Instance details

Defined in Katip.Core

Methods

fmap :: (a -> b) -> KatipT m a -> KatipT m b #

(<$) :: a -> KatipT m b -> KatipT m a #

Functor m => Functor (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

fmap :: (a -> b) -> KatipContextT m a -> KatipContextT m b #

(<$) :: a -> KatipContextT m b -> KatipContextT m a #

Functor (HashMap k) 
Instance details

Defined in Data.HashMap.Base

Methods

fmap :: (a -> b) -> HashMap k a -> HashMap k b #

(<$) :: a -> HashMap k b -> HashMap k a #

Functor m => Functor (Conc m) 
Instance details

Defined in UnliftIO.Internals.Async

Methods

fmap :: (a -> b) -> Conc m a -> Conc m b #

(<$) :: a -> Conc m b -> Conc m a #

Monad m => Functor (Concurrently m) 
Instance details

Defined in UnliftIO.Internals.Async

Methods

fmap :: (a -> b) -> Concurrently m a -> Concurrently m b #

(<$) :: a -> Concurrently m b -> Concurrently m a #

Functor (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 #

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 m => Functor (NoLoggingT m) 
Instance details

Defined in Katip.Monadic

Methods

fmap :: (a -> b) -> NoLoggingT m a -> NoLoggingT m b #

(<$) :: a -> NoLoggingT m b -> NoLoggingT m 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 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 (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 #

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 #

DRG gen => Functor (MonadPseudoRandom gen) 
Instance details

Defined in Crypto.Random.Types

Methods

fmap :: (a -> b) -> MonadPseudoRandom gen a -> MonadPseudoRandom gen b #

(<$) :: a -> MonadPseudoRandom gen b -> MonadPseudoRandom gen 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 (Mon m) 
Instance details

Defined in Env.Internal.Free

Methods

fmap :: (a -> b) -> Mon m a -> Mon m b #

(<$) :: a -> Mon m b -> Mon m 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 #

Functor f => Functor (Alt f) 
Instance details

Defined in Env.Internal.Free

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 Char :: Type -> 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 -> 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 -> 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 -> 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 -> 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 (URec (Ptr ()) :: Type -> 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 #

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 (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 #

(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 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 (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 (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 (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 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 (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 #

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 #

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 #

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 (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 (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 (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 #

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 #

Functor ((->) r :: Type -> Type)

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

fmap :: (a -> b) -> (r -> a) -> r -> b #

(<$) :: a -> (r -> b) -> r -> a #

Functor (K1 i c :: Type -> 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 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 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 (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 (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 (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 (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 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 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 (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 (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 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 #

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 #

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 #

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 #

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 #

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, 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 #

(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
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 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 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 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 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 Word8

Since: base-2.1

Instance details

Defined in GHC.Word

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 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 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 CMode 
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 CSsize 
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 CNlink 
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 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 CSpeed 
Instance details

Defined in System.Posix.Types

Num CTcflag 
Instance details

Defined in System.Posix.Types

Num CRLim 
Instance details

Defined in System.Posix.Types

Num CBlkSize 
Instance details

Defined in System.Posix.Types

Num CBlkCnt 
Instance details

Defined in System.Posix.Types

Num CClockId 
Instance details

Defined in System.Posix.Types

Num CFsBlkCnt 
Instance details

Defined in System.Posix.Types

Num CFsFilCnt 
Instance details

Defined in System.Posix.Types

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 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 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 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 Scientific 
Instance details

Defined in Data.Scientific

Methods

(+) :: Scientific -> Scientific -> Scientific #

(-) :: Scientific -> Scientific -> Scientific #

(*) :: Scientific -> Scientific -> Scientific #

negate :: Scientific -> Scientific #

abs :: Scientific -> Scientific #

signum :: Scientific -> Scientific #

fromInteger :: Integer -> Scientific #

Num TimeSpec 
Instance details

Defined in System.Clock

Methods

(+) :: TimeSpec -> TimeSpec -> TimeSpec #

(-) :: TimeSpec -> TimeSpec -> TimeSpec #

(*) :: TimeSpec -> TimeSpec -> TimeSpec #

negate :: TimeSpec -> TimeSpec #

abs :: TimeSpec -> TimeSpec #

signum :: TimeSpec -> TimeSpec #

fromInteger :: Integer -> TimeSpec #

Num 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 Tag 
Instance details

Defined in Data.ProtoLens.Encoding.Wire

Methods

(+) :: Tag -> Tag -> Tag #

(-) :: Tag -> Tag -> Tag #

(*) :: Tag -> Tag -> Tag #

negate :: Tag -> Tag #

abs :: Tag -> Tag #

signum :: Tag -> Tag #

fromInteger :: Integer -> Tag #

Num Sat Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

(+) :: Sat -> Sat -> Sat #

(-) :: Sat -> Sat -> Sat #

(*) :: Sat -> Sat -> Sat #

negate :: Sat -> Sat #

abs :: Sat -> Sat #

signum :: Sat -> Sat #

fromInteger :: Integer -> Sat #

Num MSat Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

(+) :: MSat -> MSat -> MSat #

(-) :: MSat -> MSat -> MSat #

(*) :: MSat -> MSat -> MSat #

negate :: MSat -> MSat #

abs :: MSat -> MSat #

signum :: MSat -> MSat #

fromInteger :: Integer -> MSat #

Num PortNumber 
Instance details

Defined in Network.Socket.Types

Methods

(+) :: PortNumber -> PortNumber -> PortNumber #

(-) :: PortNumber -> PortNumber -> PortNumber #

(*) :: PortNumber -> PortNumber -> PortNumber #

negate :: PortNumber -> PortNumber #

abs :: PortNumber -> PortNumber #

signum :: PortNumber -> PortNumber #

fromInteger :: Integer -> PortNumber #

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 #

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 (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 (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 (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

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 #

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 (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 (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 (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 #

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 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)

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.

The Haskell Report defines no laws for Ord. However, <= is customarily expected to implement a non-strict partial order and have the following properties:

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

Note that 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

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
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 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 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 Integer 
Instance details

Defined in GHC.Integer.Type

Ord Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Natural

Ord Ordering 
Instance details

Defined in GHC.Classes

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 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 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 SomeTypeRep 
Instance details

Defined in Data.Typeable.Internal

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 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 Clause 
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 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 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 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 FunDep 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord InjectivityAnn 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Overlap 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord () 
Instance details

Defined in GHC.Classes

Methods

compare :: () -> () -> Ordering #

(<) :: () -> () -> Bool #

(<=) :: () -> () -> Bool #

(>) :: () -> () -> Bool #

(>=) :: () -> () -> Bool #

max :: () -> () -> () #

min :: () -> () -> () #

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 BigNat 
Instance details

Defined in GHC.Integer.Type

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 Version

Since: base-2.1

Instance details

Defined in Data.Version

Ord ThreadId

Since: base-4.2.0.0

Instance details

Defined in GHC.Conc.Sync

Ord BlockReason

Since: base-4.3.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 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 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 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 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 CSsize 
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 CNlink 
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 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 CSpeed 
Instance details

Defined in System.Posix.Types

Ord CTcflag 
Instance details

Defined in System.Posix.Types

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 CBlkSize 
Instance details

Defined in System.Posix.Types

Ord CBlkCnt 
Instance details

Defined in System.Posix.Types

Ord CClockId 
Instance details

Defined in System.Posix.Types

Ord CFsBlkCnt 
Instance details

Defined in System.Posix.Types

Ord CFsFilCnt 
Instance details

Defined in System.Posix.Types

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 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 CTimer 
Instance details

Defined in System.Posix.Types

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 AsyncException

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Exception

Ord ArrayException

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 ErrorCall

Since: base-4.7.0.0

Instance details

Defined in GHC.Exception

Ord ArithException

Since: base-3.0

Instance details

Defined in GHC.Exception.Type

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 Fixity

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Ord Associativity

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Ord SourceUnpackedness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Ord SourceStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Ord DecidedStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

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 IOMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.IOMode

Ord ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Ord ByteString 
Instance details

Defined in Data.ByteString.Internal

Ord IntSet 
Instance details

Defined in Data.IntSet.Internal

Ord ModName 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord PkgName 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Module 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord OccName 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord NameFlavour 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord NameSpace 
Instance details

Defined in Language.Haskell.TH.Syntax

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 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 ModuleInfo 
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 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 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 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 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 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 DerivClause 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord DerivStrategy 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord TypeFamilyHead 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord TySynEqn 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Foreign 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Callconv 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Safety 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Pragma 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Inline 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord RuleMatch 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Phases 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord RuleBndr 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord AnnTarget 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord SourceUnpackedness 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord SourceStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord DecidedStrictness 
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 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 PatSynDir 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord PatSynArgs 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord TyVarBndr 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord FamilyResultSig 
Instance details

Defined in Language.Haskell.TH.Syntax

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 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 AnnLookup 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Builder 
Instance details

Defined in Data.Text.Internal.Builder

Ord LocalTime 
Instance details

Defined in Data.Time.LocalTime.Internal.LocalTime

Ord UniversalTime 
Instance details

Defined in Data.Time.Clock.Internal.UniversalTime

Ord UTCTime 
Instance details

Defined in Data.Time.Clock.Internal.UTCTime

Ord AbsoluteTime 
Instance details

Defined in Data.Time.Clock.Internal.AbsoluteTime

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 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 CompressionStrategy 
Instance details

Defined in Codec.Compression.Zlib.Stream

Ord Date 
Instance details

Defined in Chronos

Methods

compare :: Date -> Date -> Ordering #

(<) :: Date -> Date -> Bool #

(<=) :: Date -> Date -> Bool #

(>) :: Date -> Date -> Bool #

(>=) :: Date -> Date -> Bool #

max :: Date -> Date -> Date #

min :: Date -> Date -> Date #

Ord Datetime 
Instance details

Defined in Chronos

Methods

compare :: Datetime -> Datetime -> Ordering #

(<) :: Datetime -> Datetime -> Bool #

(<=) :: Datetime -> Datetime -> Bool #

(>) :: Datetime -> Datetime -> Bool #

(>=) :: Datetime -> Datetime -> Bool #

max :: Datetime -> Datetime -> Datetime #

min :: Datetime -> Datetime -> Datetime #

Ord DatetimeFormat 
Instance details

Defined in Chronos

Methods

compare :: DatetimeFormat -> DatetimeFormat -> Ordering #

(<) :: DatetimeFormat -> DatetimeFormat -> Bool #

(<=) :: DatetimeFormat -> DatetimeFormat -> Bool #

(>) :: DatetimeFormat -> DatetimeFormat -> Bool #

(>=) :: DatetimeFormat -> DatetimeFormat -> Bool #

max :: DatetimeFormat -> DatetimeFormat -> DatetimeFormat #

min :: DatetimeFormat -> DatetimeFormat -> DatetimeFormat #

Ord Day 
Instance details

Defined in Chronos

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 DayOfMonth 
Instance details

Defined in Chronos

Methods

compare :: DayOfMonth -> DayOfMonth -> Ordering #

(<) :: DayOfMonth -> DayOfMonth -> Bool #

(<=) :: DayOfMonth -> DayOfMonth -> Bool #

(>) :: DayOfMonth -> DayOfMonth -> Bool #

(>=) :: DayOfMonth -> DayOfMonth -> Bool #

max :: DayOfMonth -> DayOfMonth -> DayOfMonth #

min :: DayOfMonth -> DayOfMonth -> DayOfMonth #

Ord DayOfWeek 
Instance details

Defined in Chronos

Methods

compare :: DayOfWeek -> DayOfWeek -> Ordering #

(<) :: DayOfWeek -> DayOfWeek -> Bool #

(<=) :: DayOfWeek -> DayOfWeek -> Bool #

(>) :: DayOfWeek -> DayOfWeek -> Bool #

(>=) :: DayOfWeek -> DayOfWeek -> Bool #

max :: DayOfWeek -> DayOfWeek -> DayOfWeek #

min :: DayOfWeek -> DayOfWeek -> DayOfWeek #

Ord DayOfYear 
Instance details

Defined in Chronos

Methods

compare :: DayOfYear -> DayOfYear -> Ordering #

(<) :: DayOfYear -> DayOfYear -> Bool #

(<=) :: DayOfYear -> DayOfYear -> Bool #

(>) :: DayOfYear -> DayOfYear -> Bool #

(>=) :: DayOfYear -> DayOfYear -> Bool #

max :: DayOfYear -> DayOfYear -> DayOfYear #

min :: DayOfYear -> DayOfYear -> DayOfYear #

Ord Month 
Instance details

Defined in Chronos

Methods

compare :: Month -> Month -> Ordering #

(<) :: Month -> Month -> Bool #

(<=) :: Month -> Month -> Bool #

(>) :: Month -> Month -> Bool #

(>=) :: Month -> Month -> Bool #

max :: Month -> Month -> Month #

min :: Month -> Month -> Month #

Ord MonthDate 
Instance details

Defined in Chronos

Methods

compare :: MonthDate -> MonthDate -> Ordering #

(<) :: MonthDate -> MonthDate -> Bool #

(<=) :: MonthDate -> MonthDate -> Bool #

(>) :: MonthDate -> MonthDate -> Bool #

(>=) :: MonthDate -> MonthDate -> Bool #

max :: MonthDate -> MonthDate -> MonthDate #

min :: MonthDate -> MonthDate -> MonthDate #

Ord Offset 
Instance details

Defined in Chronos

Methods

compare :: Offset -> Offset -> Ordering #

(<) :: Offset -> Offset -> Bool #

(<=) :: Offset -> Offset -> Bool #

(>) :: Offset -> Offset -> Bool #

(>=) :: Offset -> Offset -> Bool #

max :: Offset -> Offset -> Offset #

min :: Offset -> Offset -> Offset #

Ord OffsetDatetime 
Instance details

Defined in Chronos

Methods

compare :: OffsetDatetime -> OffsetDatetime -> Ordering #

(<) :: OffsetDatetime -> OffsetDatetime -> Bool #

(<=) :: OffsetDatetime -> OffsetDatetime -> Bool #

(>) :: OffsetDatetime -> OffsetDatetime -> Bool #

(>=) :: OffsetDatetime -> OffsetDatetime -> Bool #

max :: OffsetDatetime -> OffsetDatetime -> OffsetDatetime #

min :: OffsetDatetime -> OffsetDatetime -> OffsetDatetime #

Ord OffsetFormat 
Instance details

Defined in Chronos

Methods

compare :: OffsetFormat -> OffsetFormat -> Ordering #

(<) :: OffsetFormat -> OffsetFormat -> Bool #

(<=) :: OffsetFormat -> OffsetFormat -> Bool #

(>) :: OffsetFormat -> OffsetFormat -> Bool #

(>=) :: OffsetFormat -> OffsetFormat -> Bool #

max :: OffsetFormat -> OffsetFormat -> OffsetFormat #

min :: OffsetFormat -> OffsetFormat -> OffsetFormat #

Ord OrdinalDate 
Instance details

Defined in Chronos

Methods

compare :: OrdinalDate -> OrdinalDate -> Ordering #

(<) :: OrdinalDate -> OrdinalDate -> Bool #

(<=) :: OrdinalDate -> OrdinalDate -> Bool #

(>) :: OrdinalDate -> OrdinalDate -> Bool #

(>=) :: OrdinalDate -> OrdinalDate -> Bool #

max :: OrdinalDate -> OrdinalDate -> OrdinalDate #

min :: OrdinalDate -> OrdinalDate -> OrdinalDate #

Ord SubsecondPrecision 
Instance details

Defined in Chronos

Ord Time 
Instance details

Defined in Chronos

Methods

compare :: Time -> Time -> Ordering #

(<) :: Time -> Time -> Bool #

(<=) :: Time -> Time -> Bool #

(>) :: Time -> Time -> Bool #

(>=) :: Time -> Time -> Bool #

max :: Time -> Time -> Time #

min :: Time -> Time -> Time #

Ord TimeInterval 
Instance details

Defined in Chronos

Methods

compare :: TimeInterval -> TimeInterval -> Ordering #

(<) :: TimeInterval -> TimeInterval -> Bool #

(<=) :: TimeInterval -> TimeInterval -> Bool #

(>) :: TimeInterval -> TimeInterval -> Bool #

(>=) :: TimeInterval -> TimeInterval -> Bool #

max :: TimeInterval -> TimeInterval -> TimeInterval #

min :: TimeInterval -> TimeInterval -> TimeInterval #

Ord TimeOfDay 
Instance details

Defined in Chronos

Methods

compare :: TimeOfDay -> TimeOfDay -> Ordering #

(<) :: TimeOfDay -> TimeOfDay -> Bool #

(<=) :: TimeOfDay -> TimeOfDay -> Bool #

(>) :: TimeOfDay -> TimeOfDay -> Bool #

(>=) :: TimeOfDay -> TimeOfDay -> Bool #

max :: TimeOfDay -> TimeOfDay -> TimeOfDay #

min :: TimeOfDay -> TimeOfDay -> TimeOfDay #

Ord Timespan 
Instance details

Defined in Chronos

Ord Year 
Instance details

Defined in Chronos

Methods

compare :: Year -> Year -> Ordering #

(<) :: Year -> Year -> Bool #

(<=) :: Year -> Year -> Bool #

(>) :: Year -> Year -> Bool #

(>=) :: Year -> Year -> Bool #

max :: Year -> Year -> Year #

min :: Year -> Year -> Year #

Ord JSONPathElement 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

compare :: JSONPathElement -> JSONPathElement -> Ordering #

(<) :: JSONPathElement -> JSONPathElement -> Bool #

(<=) :: JSONPathElement -> JSONPathElement -> Bool #

(>) :: JSONPathElement -> JSONPathElement -> Bool #

(>=) :: JSONPathElement -> JSONPathElement -> Bool #

max :: JSONPathElement -> JSONPathElement -> JSONPathElement #

min :: JSONPathElement -> JSONPathElement -> JSONPathElement #

Ord 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 ByteArray 
Instance details

Defined in Data.Primitive.ByteArray

Methods

compare :: ByteArray -> ByteArray -> Ordering #

(<) :: ByteArray -> ByteArray -> Bool #

(<=) :: ByteArray -> ByteArray -> Bool #

(>) :: ByteArray -> ByteArray -> Bool #

(>=) :: ByteArray -> ByteArray -> Bool #

max :: ByteArray -> ByteArray -> ByteArray #

min :: ByteArray -> ByteArray -> ByteArray #

Ord DotNetTime 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

compare :: DotNetTime -> DotNetTime -> Ordering #

(<) :: DotNetTime -> DotNetTime -> Bool #

(<=) :: DotNetTime -> DotNetTime -> Bool #

(>) :: DotNetTime -> DotNetTime -> Bool #

(>=) :: DotNetTime -> DotNetTime -> Bool #

max :: DotNetTime -> DotNetTime -> DotNetTime #

min :: DotNetTime -> DotNetTime -> DotNetTime #

Ord OverflowNatural 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

compare :: OverflowNatural -> OverflowNatural -> Ordering #

(<) :: OverflowNatural -> OverflowNatural -> Bool #

(<=) :: OverflowNatural -> OverflowNatural -> Bool #

(>) :: OverflowNatural -> OverflowNatural -> Bool #

(>=) :: OverflowNatural -> OverflowNatural -> Bool #

max :: OverflowNatural -> OverflowNatural -> OverflowNatural #

min :: OverflowNatural -> OverflowNatural -> OverflowNatural #

Ord IsolationLevel 
Instance details

Defined in Database.Persist.Sql.Types.Internal

Methods

compare :: IsolationLevel -> IsolationLevel -> Ordering #

(<) :: IsolationLevel -> IsolationLevel -> Bool #

(<=) :: IsolationLevel -> IsolationLevel -> Bool #

(>) :: IsolationLevel -> IsolationLevel -> Bool #

(>=) :: IsolationLevel -> IsolationLevel -> Bool #

max :: IsolationLevel -> IsolationLevel -> IsolationLevel #

min :: IsolationLevel -> IsolationLevel -> IsolationLevel #

Ord CascadeAction 
Instance details

Defined in Database.Persist.Types.Base

Methods

compare :: CascadeAction -> CascadeAction -> Ordering #

(<) :: CascadeAction -> CascadeAction -> Bool #

(<=) :: CascadeAction -> CascadeAction -> Bool #

(>) :: CascadeAction -> CascadeAction -> Bool #

(>=) :: CascadeAction -> CascadeAction -> Bool #

max :: CascadeAction -> CascadeAction -> CascadeAction #

min :: CascadeAction -> CascadeAction -> CascadeAction #

Ord Checkmark 
Instance details

Defined in Database.Persist.Types.Base

Methods

compare :: Checkmark -> Checkmark -> Ordering #

(<) :: Checkmark -> Checkmark -> Bool #

(<=) :: Checkmark -> Checkmark -> Bool #

(>) :: Checkmark -> Checkmark -> Bool #

(>=) :: Checkmark -> Checkmark -> Bool #

max :: Checkmark -> Checkmark -> Checkmark #

min :: Checkmark -> Checkmark -> Checkmark #

Ord CompositeDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

compare :: CompositeDef -> CompositeDef -> Ordering #

(<) :: CompositeDef -> CompositeDef -> Bool #

(<=) :: CompositeDef -> CompositeDef -> Bool #

(>) :: CompositeDef -> CompositeDef -> Bool #

(>=) :: CompositeDef -> CompositeDef -> Bool #

max :: CompositeDef -> CompositeDef -> CompositeDef #

min :: CompositeDef -> CompositeDef -> CompositeDef #

Ord DBName 
Instance details

Defined in Database.Persist.Types.Base

Methods

compare :: DBName -> DBName -> Ordering #

(<) :: DBName -> DBName -> Bool #

(<=) :: DBName -> DBName -> Bool #

(>) :: DBName -> DBName -> Bool #

(>=) :: DBName -> DBName -> Bool #

max :: DBName -> DBName -> DBName #

min :: DBName -> DBName -> DBName #

Ord EmbedEntityDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

compare :: EmbedEntityDef -> EmbedEntityDef -> Ordering #

(<) :: EmbedEntityDef -> EmbedEntityDef -> Bool #

(<=) :: EmbedEntityDef -> EmbedEntityDef -> Bool #

(>) :: EmbedEntityDef -> EmbedEntityDef -> Bool #

(>=) :: EmbedEntityDef -> EmbedEntityDef -> Bool #

max :: EmbedEntityDef -> EmbedEntityDef -> EmbedEntityDef #

min :: EmbedEntityDef -> EmbedEntityDef -> EmbedEntityDef #

Ord EmbedFieldDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

compare :: EmbedFieldDef -> EmbedFieldDef -> Ordering #

(<) :: EmbedFieldDef -> EmbedFieldDef -> Bool #

(<=) :: EmbedFieldDef -> EmbedFieldDef -> Bool #

(>) :: EmbedFieldDef -> EmbedFieldDef -> Bool #

(>=) :: EmbedFieldDef -> EmbedFieldDef -> Bool #

max :: EmbedFieldDef -> EmbedFieldDef -> EmbedFieldDef #

min :: EmbedFieldDef -> EmbedFieldDef -> EmbedFieldDef #

Ord EntityDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

compare :: EntityDef -> EntityDef -> Ordering #

(<) :: EntityDef -> EntityDef -> Bool #

(<=) :: EntityDef -> EntityDef -> Bool #

(>) :: EntityDef -> EntityDef -> Bool #

(>=) :: EntityDef -> EntityDef -> Bool #

max :: EntityDef -> EntityDef -> EntityDef #

min :: EntityDef -> EntityDef -> EntityDef #

Ord FieldAttr 
Instance details

Defined in Database.Persist.Types.Base

Methods

compare :: FieldAttr -> FieldAttr -> Ordering #

(<) :: FieldAttr -> FieldAttr -> Bool #

(<=) :: FieldAttr -> FieldAttr -> Bool #

(>) :: FieldAttr -> FieldAttr -> Bool #

(>=) :: FieldAttr -> FieldAttr -> Bool #

max :: FieldAttr -> FieldAttr -> FieldAttr #

min :: FieldAttr -> FieldAttr -> FieldAttr #

Ord FieldCascade 
Instance details

Defined in Database.Persist.Types.Base

Methods

compare :: FieldCascade -> FieldCascade -> Ordering #

(<) :: FieldCascade -> FieldCascade -> Bool #

(<=) :: FieldCascade -> FieldCascade -> Bool #

(>) :: FieldCascade -> FieldCascade -> Bool #

(>=) :: FieldCascade -> FieldCascade -> Bool #

max :: FieldCascade -> FieldCascade -> FieldCascade #

min :: FieldCascade -> FieldCascade -> FieldCascade #

Ord FieldDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

compare :: FieldDef -> FieldDef -> Ordering #

(<) :: FieldDef -> FieldDef -> Bool #

(<=) :: FieldDef -> FieldDef -> Bool #

(>) :: FieldDef -> FieldDef -> Bool #

(>=) :: FieldDef -> FieldDef -> Bool #

max :: FieldDef -> FieldDef -> FieldDef #

min :: FieldDef -> FieldDef -> FieldDef #

Ord FieldType 
Instance details

Defined in Database.Persist.Types.Base

Methods

compare :: FieldType -> FieldType -> Ordering #

(<) :: FieldType -> FieldType -> Bool #

(<=) :: FieldType -> FieldType -> Bool #

(>) :: FieldType -> FieldType -> Bool #

(>=) :: FieldType -> FieldType -> Bool #

max :: FieldType -> FieldType -> FieldType #

min :: FieldType -> FieldType -> FieldType #

Ord ForeignDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

compare :: ForeignDef -> ForeignDef -> Ordering #

(<) :: ForeignDef -> ForeignDef -> Bool #

(<=) :: ForeignDef -> ForeignDef -> Bool #

(>) :: ForeignDef -> ForeignDef -> Bool #

(>=) :: ForeignDef -> ForeignDef -> Bool #

max :: ForeignDef -> ForeignDef -> ForeignDef #

min :: ForeignDef -> ForeignDef -> ForeignDef #

Ord HaskellName 
Instance details

Defined in Database.Persist.Types.Base

Methods

compare :: HaskellName -> HaskellName -> Ordering #

(<) :: HaskellName -> HaskellName -> Bool #

(<=) :: HaskellName -> HaskellName -> Bool #

(>) :: HaskellName -> HaskellName -> Bool #

(>=) :: HaskellName -> HaskellName -> Bool #

max :: HaskellName -> HaskellName -> HaskellName #

min :: HaskellName -> HaskellName -> HaskellName #

Ord PersistValue 
Instance details

Defined in Database.Persist.Types.Base

Methods

compare :: PersistValue -> PersistValue -> Ordering #

(<) :: PersistValue -> PersistValue -> Bool #

(<=) :: PersistValue -> PersistValue -> Bool #

(>) :: PersistValue -> PersistValue -> Bool #

(>=) :: PersistValue -> PersistValue -> Bool #

max :: PersistValue -> PersistValue -> PersistValue #

min :: PersistValue -> PersistValue -> PersistValue #

Ord ReferenceDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

compare :: ReferenceDef -> ReferenceDef -> Ordering #

(<) :: ReferenceDef -> ReferenceDef -> Bool #

(<=) :: ReferenceDef -> ReferenceDef -> Bool #

(>) :: ReferenceDef -> ReferenceDef -> Bool #

(>=) :: ReferenceDef -> ReferenceDef -> Bool #

max :: ReferenceDef -> ReferenceDef -> ReferenceDef #

min :: ReferenceDef -> ReferenceDef -> ReferenceDef #

Ord SqlType 
Instance details

Defined in Database.Persist.Types.Base

Methods

compare :: SqlType -> SqlType -> Ordering #

(<) :: SqlType -> SqlType -> Bool #

(<=) :: SqlType -> SqlType -> Bool #

(>) :: SqlType -> SqlType -> Bool #

(>=) :: SqlType -> SqlType -> Bool #

max :: SqlType -> SqlType -> SqlType #

min :: SqlType -> SqlType -> SqlType #

Ord UniqueDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

compare :: UniqueDef -> UniqueDef -> Ordering #

(<) :: UniqueDef -> UniqueDef -> Bool #

(<=) :: UniqueDef -> UniqueDef -> Bool #

(>) :: UniqueDef -> UniqueDef -> Bool #

(>=) :: UniqueDef -> UniqueDef -> Bool #

max :: UniqueDef -> UniqueDef -> UniqueDef #

min :: UniqueDef -> UniqueDef -> UniqueDef #

Ord Environment 
Instance details

Defined in Katip.Core

Methods

compare :: Environment -> Environment -> Ordering #

(<) :: Environment -> Environment -> Bool #

(<=) :: Environment -> Environment -> Bool #

(>) :: Environment -> Environment -> Bool #

(>=) :: Environment -> Environment -> Bool #

max :: Environment -> Environment -> Environment #

min :: Environment -> Environment -> Environment #

Ord Namespace 
Instance details

Defined in Katip.Core

Ord Severity 
Instance details

Defined in Katip.Core

Ord ThreadIdText 
Instance details

Defined in Katip.Core

Methods

compare :: ThreadIdText -> ThreadIdText -> Ordering #

(<) :: ThreadIdText -> ThreadIdText -> Bool #

(<=) :: ThreadIdText -> ThreadIdText -> Bool #

(>) :: ThreadIdText -> ThreadIdText -> Bool #

(>=) :: ThreadIdText -> ThreadIdText -> Bool #

max :: ThreadIdText -> ThreadIdText -> ThreadIdText #

min :: ThreadIdText -> ThreadIdText -> ThreadIdText #

Ord Verbosity 
Instance details

Defined in Katip.Core

Ord Undefined 
Instance details

Defined in Universum.Debug

Ord ConcException 
Instance details

Defined in UnliftIO.Internals.Async

Methods

compare :: ConcException -> ConcException -> Ordering #

(<) :: ConcException -> ConcException -> Bool #

(<=) :: ConcException -> ConcException -> Bool #

(>) :: ConcException -> ConcException -> Bool #

(>=) :: ConcException -> ConcException -> Bool #

max :: ConcException -> ConcException -> ConcException #

min :: ConcException -> ConcException -> ConcException #

Ord UnixDiffTime 
Instance details

Defined in Data.UnixTime.Types

Methods

compare :: UnixDiffTime -> UnixDiffTime -> Ordering #

(<) :: UnixDiffTime -> UnixDiffTime -> Bool #

(<=) :: UnixDiffTime -> UnixDiffTime -> Bool #

(>) :: UnixDiffTime -> UnixDiffTime -> Bool #

(>=) :: UnixDiffTime -> UnixDiffTime -> Bool #

max :: UnixDiffTime -> UnixDiffTime -> UnixDiffTime #

min :: UnixDiffTime -> UnixDiffTime -> UnixDiffTime #

Ord UnixTime 
Instance details

Defined in Data.UnixTime.Types

Methods

compare :: UnixTime -> UnixTime -> Ordering #

(<) :: UnixTime -> UnixTime -> Bool #

(<=) :: UnixTime -> UnixTime -> Bool #

(>) :: UnixTime -> UnixTime -> Bool #

(>=) :: UnixTime -> UnixTime -> Bool #

max :: UnixTime -> UnixTime -> UnixTime #

min :: UnixTime -> UnixTime -> UnixTime #

Ord Scientific 
Instance details

Defined in Data.Scientific

Methods

compare :: Scientific -> Scientific -> Ordering #

(<) :: Scientific -> Scientific -> Bool #

(<=) :: Scientific -> Scientific -> Bool #

(>) :: Scientific -> Scientific -> Bool #

(>=) :: Scientific -> Scientific -> Bool #

max :: Scientific -> Scientific -> Scientific #

min :: Scientific -> Scientific -> Scientific #

Ord TimeSpec 
Instance details

Defined in System.Clock

Methods

compare :: TimeSpec -> TimeSpec -> Ordering #

(<) :: TimeSpec -> TimeSpec -> Bool #

(<=) :: TimeSpec -> TimeSpec -> Bool #

(>) :: TimeSpec -> TimeSpec -> Bool #

(>=) :: TimeSpec -> TimeSpec -> Bool #

max :: TimeSpec -> TimeSpec -> TimeSpec #

min :: TimeSpec -> TimeSpec -> TimeSpec #

Ord ConstructorVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

compare :: ConstructorVariant -> ConstructorVariant -> Ordering #

(<) :: ConstructorVariant -> ConstructorVariant -> Bool #

(<=) :: ConstructorVariant -> ConstructorVariant -> Bool #

(>) :: ConstructorVariant -> ConstructorVariant -> Bool #

(>=) :: ConstructorVariant -> ConstructorVariant -> Bool #

max :: ConstructorVariant -> ConstructorVariant -> ConstructorVariant #

min :: ConstructorVariant -> ConstructorVariant -> ConstructorVariant #

Ord DatatypeVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

compare :: DatatypeVariant -> DatatypeVariant -> Ordering #

(<) :: DatatypeVariant -> DatatypeVariant -> Bool #

(<=) :: DatatypeVariant -> DatatypeVariant -> Bool #

(>) :: DatatypeVariant -> DatatypeVariant -> Bool #

(>=) :: DatatypeVariant -> DatatypeVariant -> Bool #

max :: DatatypeVariant -> DatatypeVariant -> DatatypeVariant #

min :: DatatypeVariant -> DatatypeVariant -> DatatypeVariant #

Ord FieldStrictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

compare :: FieldStrictness -> FieldStrictness -> Ordering #

(<) :: FieldStrictness -> FieldStrictness -> Bool #

(<=) :: FieldStrictness -> FieldStrictness -> Bool #

(>) :: FieldStrictness -> FieldStrictness -> Bool #

(>=) :: FieldStrictness -> FieldStrictness -> Bool #

max :: FieldStrictness -> FieldStrictness -> FieldStrictness #

min :: FieldStrictness -> FieldStrictness -> FieldStrictness #

Ord Strictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

compare :: Strictness -> Strictness -> Ordering #

(<) :: Strictness -> Strictness -> Bool #

(<=) :: Strictness -> Strictness -> Bool #

(>) :: Strictness -> Strictness -> Bool #

(>=) :: Strictness -> Strictness -> Bool #

max :: Strictness -> Strictness -> Strictness #

min :: Strictness -> Strictness -> Strictness #

Ord Unpackedness 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

compare :: Unpackedness -> Unpackedness -> Ordering #

(<) :: Unpackedness -> Unpackedness -> Bool #

(<=) :: Unpackedness -> Unpackedness -> Bool #

(>) :: Unpackedness -> Unpackedness -> Bool #

(>=) :: Unpackedness -> Unpackedness -> Bool #

max :: Unpackedness -> Unpackedness -> Unpackedness #

min :: Unpackedness -> Unpackedness -> Unpackedness #

Ord LogLevel 
Instance details

Defined in Control.Monad.Logger

Methods

compare :: LogLevel -> LogLevel -> Ordering #

(<) :: LogLevel -> LogLevel -> Bool #

(<=) :: LogLevel -> LogLevel -> Bool #

(>) :: LogLevel -> LogLevel -> Bool #

(>=) :: LogLevel -> LogLevel -> Bool #

max :: LogLevel -> LogLevel -> LogLevel #

min :: LogLevel -> LogLevel -> LogLevel #

Ord UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

compare :: UUID -> UUID -> Ordering #

(<) :: UUID -> UUID -> Bool #

(<=) :: UUID -> UUID -> Bool #

(>) :: UUID -> UUID -> Bool #

(>=) :: UUID -> UUID -> Bool #

max :: UUID -> UUID -> UUID #

min :: UUID -> UUID -> UUID #

Ord UnpackedUUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

compare :: UnpackedUUID -> UnpackedUUID -> Ordering #

(<) :: UnpackedUUID -> UnpackedUUID -> Bool #

(<=) :: UnpackedUUID -> UnpackedUUID -> Bool #

(>) :: UnpackedUUID -> UnpackedUUID -> Bool #

(>=) :: UnpackedUUID -> UnpackedUUID -> Bool #

max :: UnpackedUUID -> UnpackedUUID -> UnpackedUUID #

min :: UnpackedUUID -> UnpackedUUID -> UnpackedUUID #

Ord Addr 
Instance details

Defined in Data.Primitive.Types

Methods

compare :: Addr -> Addr -> Ordering #

(<) :: Addr -> Addr -> Bool #

(<=) :: Addr -> Addr -> Bool #

(>) :: Addr -> Addr -> Bool #

(>=) :: Addr -> Addr -> Bool #

max :: Addr -> Addr -> Addr #

min :: Addr -> Addr -> Addr #

Ord Leniency 
Instance details

Defined in Data.String.Conv

Methods

compare :: Leniency -> Leniency -> Ordering #

(<) :: Leniency -> Leniency -> Bool #

(<=) :: Leniency -> Leniency -> Bool #

(>) :: Leniency -> Leniency -> Bool #

(>=) :: Leniency -> Leniency -> Bool #

max :: Leniency -> Leniency -> Leniency #

min :: Leniency -> Leniency -> Leniency #

Ord ClientError 
Instance details

Defined in Network.HTTP2.Client.Exceptions

Methods

compare :: ClientError -> ClientError -> Ordering #

(<) :: ClientError -> ClientError -> Bool #

(<=) :: ClientError -> ClientError -> Bool #

(>) :: ClientError -> ClientError -> Bool #

(>=) :: ClientError -> ClientError -> Bool #

max :: ClientError -> ClientError -> ClientError #

min :: ClientError -> ClientError -> ClientError #

Ord Tag 
Instance details

Defined in Data.ProtoLens.Encoding.Wire

Methods

compare :: Tag -> Tag -> Ordering #

(<) :: Tag -> Tag -> Bool #

(<=) :: Tag -> Tag -> Bool #

(>) :: Tag -> Tag -> Bool #

(>=) :: Tag -> Tag -> Bool #

max :: Tag -> Tag -> Tag #

min :: Tag -> Tag -> Tag #

Ord TaggedValue 
Instance details

Defined in Data.ProtoLens.Encoding.Wire

Methods

compare :: TaggedValue -> TaggedValue -> Ordering #

(<) :: TaggedValue -> TaggedValue -> Bool #

(<=) :: TaggedValue -> TaggedValue -> Bool #

(>) :: TaggedValue -> TaggedValue -> Bool #

(>=) :: TaggedValue -> TaggedValue -> Bool #

max :: TaggedValue -> TaggedValue -> TaggedValue #

min :: TaggedValue -> TaggedValue -> TaggedValue #

Ord PixelCMYK16 
Instance details

Defined in Codec.Picture.Types

Methods

compare :: PixelCMYK16 -> PixelCMYK16 -> Ordering #

(<) :: PixelCMYK16 -> PixelCMYK16 -> Bool #

(<=) :: PixelCMYK16 -> PixelCMYK16 -> Bool #

(>) :: PixelCMYK16 -> PixelCMYK16 -> Bool #

(>=) :: PixelCMYK16 -> PixelCMYK16 -> Bool #

max :: PixelCMYK16 -> PixelCMYK16 -> PixelCMYK16 #

min :: PixelCMYK16 -> PixelCMYK16 -> PixelCMYK16 #

Ord PixelCMYK8 
Instance details

Defined in Codec.Picture.Types

Methods

compare :: PixelCMYK8 -> PixelCMYK8 -> Ordering #

(<) :: PixelCMYK8 -> PixelCMYK8 -> Bool #

(<=) :: PixelCMYK8 -> PixelCMYK8 -> Bool #

(>) :: PixelCMYK8 -> PixelCMYK8 -> Bool #

(>=) :: PixelCMYK8 -> PixelCMYK8 -> Bool #

max :: PixelCMYK8 -> PixelCMYK8 -> PixelCMYK8 #

min :: PixelCMYK8 -> PixelCMYK8 -> PixelCMYK8 #

Ord PixelRGB16 
Instance details

Defined in Codec.Picture.Types

Methods

compare :: PixelRGB16 -> PixelRGB16 -> Ordering #

(<) :: PixelRGB16 -> PixelRGB16 -> Bool #

(<=) :: PixelRGB16 -> PixelRGB16 -> Bool #

(>) :: PixelRGB16 -> PixelRGB16 -> Bool #

(>=) :: PixelRGB16 -> PixelRGB16 -> Bool #

max :: PixelRGB16 -> PixelRGB16 -> PixelRGB16 #

min :: PixelRGB16 -> PixelRGB16 -> PixelRGB16 #

Ord PixelRGB8 
Instance details

Defined in Codec.Picture.Types

Methods

compare :: PixelRGB8 -> PixelRGB8 -> Ordering #

(<) :: PixelRGB8 -> PixelRGB8 -> Bool #

(<=) :: PixelRGB8 -> PixelRGB8 -> Bool #

(>) :: PixelRGB8 -> PixelRGB8 -> Bool #

(>=) :: PixelRGB8 -> PixelRGB8 -> Bool #

max :: PixelRGB8 -> PixelRGB8 -> PixelRGB8 #

min :: PixelRGB8 -> PixelRGB8 -> PixelRGB8 #

Ord PixelRGBA16 
Instance details

Defined in Codec.Picture.Types

Methods

compare :: PixelRGBA16 -> PixelRGBA16 -> Ordering #

(<) :: PixelRGBA16 -> PixelRGBA16 -> Bool #

(<=) :: PixelRGBA16 -> PixelRGBA16 -> Bool #

(>) :: PixelRGBA16 -> PixelRGBA16 -> Bool #

(>=) :: PixelRGBA16 -> PixelRGBA16 -> Bool #

max :: PixelRGBA16 -> PixelRGBA16 -> PixelRGBA16 #

min :: PixelRGBA16 -> PixelRGBA16 -> PixelRGBA16 #

Ord PixelRGBA8 
Instance details

Defined in Codec.Picture.Types

Methods

compare :: PixelRGBA8 -> PixelRGBA8 -> Ordering #

(<) :: PixelRGBA8 -> PixelRGBA8 -> Bool #

(<=) :: PixelRGBA8 -> PixelRGBA8 -> Bool #

(>) :: PixelRGBA8 -> PixelRGBA8 -> Bool #

(>=) :: PixelRGBA8 -> PixelRGBA8 -> Bool #

max :: PixelRGBA8 -> PixelRGBA8 -> PixelRGBA8 #

min :: PixelRGBA8 -> PixelRGBA8 -> PixelRGBA8 #

Ord PixelRGBF 
Instance details

Defined in Codec.Picture.Types

Methods

compare :: PixelRGBF -> PixelRGBF -> Ordering #

(<) :: PixelRGBF -> PixelRGBF -> Bool #

(<=) :: PixelRGBF -> PixelRGBF -> Bool #

(>) :: PixelRGBF -> PixelRGBF -> Bool #

(>=) :: PixelRGBF -> PixelRGBF -> Bool #

max :: PixelRGBF -> PixelRGBF -> PixelRGBF #

min :: PixelRGBF -> PixelRGBF -> PixelRGBF #

Ord PixelYA16 
Instance details

Defined in Codec.Picture.Types

Methods

compare :: PixelYA16 -> PixelYA16 -> Ordering #

(<) :: PixelYA16 -> PixelYA16 -> Bool #

(<=) :: PixelYA16 -> PixelYA16 -> Bool #

(>) :: PixelYA16 -> PixelYA16 -> Bool #

(>=) :: PixelYA16 -> PixelYA16 -> Bool #

max :: PixelYA16 -> PixelYA16 -> PixelYA16 #

min :: PixelYA16 -> PixelYA16 -> PixelYA16 #

Ord PixelYA8 
Instance details

Defined in Codec.Picture.Types

Methods

compare :: PixelYA8 -> PixelYA8 -> Ordering #

(<) :: PixelYA8 -> PixelYA8 -> Bool #

(<=) :: PixelYA8 -> PixelYA8 -> Bool #

(>) :: PixelYA8 -> PixelYA8 -> Bool #

(>=) :: PixelYA8 -> PixelYA8 -> Bool #

max :: PixelYA8 -> PixelYA8 -> PixelYA8 #

min :: PixelYA8 -> PixelYA8 -> PixelYA8 #

Ord PixelYCbCr8 
Instance details

Defined in Codec.Picture.Types

Methods

compare :: PixelYCbCr8 -> PixelYCbCr8 -> Ordering #

(<) :: PixelYCbCr8 -> PixelYCbCr8 -> Bool #

(<=) :: PixelYCbCr8 -> PixelYCbCr8 -> Bool #

(>) :: PixelYCbCr8 -> PixelYCbCr8 -> Bool #

(>=) :: PixelYCbCr8 -> PixelYCbCr8 -> Bool #

max :: PixelYCbCr8 -> PixelYCbCr8 -> PixelYCbCr8 #

min :: PixelYCbCr8 -> PixelYCbCr8 -> PixelYCbCr8 #

Ord PixelYCbCrK8 
Instance details

Defined in Codec.Picture.Types

Methods

compare :: PixelYCbCrK8 -> PixelYCbCrK8 -> Ordering #

(<) :: PixelYCbCrK8 -> PixelYCbCrK8 -> Bool #

(<=) :: PixelYCbCrK8 -> PixelYCbCrK8 -> Bool #

(>) :: PixelYCbCrK8 -> PixelYCbCrK8 -> Bool #

(>=) :: PixelYCbCrK8 -> PixelYCbCrK8 -> Bool #

max :: PixelYCbCrK8 -> PixelYCbCrK8 -> PixelYCbCrK8 #

min :: PixelYCbCrK8 -> PixelYCbCrK8 -> PixelYCbCrK8 #

Ord WireValue 
Instance details

Defined in Data.ProtoLens.Encoding.Wire

Methods

compare :: WireValue -> WireValue -> Ordering #

(<) :: WireValue -> WireValue -> Bool #

(<=) :: WireValue -> WireValue -> Bool #

(>) :: WireValue -> WireValue -> Bool #

(>=) :: WireValue -> WireValue -> Bool #

max :: WireValue -> WireValue -> WireValue #

min :: WireValue -> WireValue -> WireValue #

Ord StreamingType 
Instance details

Defined in Data.ProtoLens.Service.Types

Methods

compare :: StreamingType -> StreamingType -> Ordering #

(<) :: StreamingType -> StreamingType -> Bool #

(<=) :: StreamingType -> StreamingType -> Bool #

(>) :: StreamingType -> StreamingType -> Bool #

(>=) :: StreamingType -> StreamingType -> Bool #

max :: StreamingType -> StreamingType -> StreamingType #

min :: StreamingType -> StreamingType -> StreamingType #

Ord WalletBalanceResponse'AccountBalanceEntry Source # 
Instance details

Defined in Proto.LndGrpc

Ord WalletBalanceResponse Source # 
Instance details

Defined in Proto.LndGrpc

Ord WalletBalanceRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord WalletAccountBalance Source # 
Instance details

Defined in Proto.LndGrpc

Ord VerifyMessageResponse Source # 
Instance details

Defined in Proto.LndGrpc

Ord VerifyMessageRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord VerifyChanBackupResponse Source # 
Instance details

Defined in Proto.LndGrpc

Ord Utxo Source # 
Instance details

Defined in Proto.LndGrpc

Methods

compare :: Utxo -> Utxo -> Ordering #

(<) :: Utxo -> Utxo -> Bool #

(<=) :: Utxo -> Utxo -> Bool #

(>) :: Utxo -> Utxo -> Bool #

(>=) :: Utxo -> Utxo -> Bool #

max :: Utxo -> Utxo -> Utxo #

min :: Utxo -> Utxo -> Utxo #

Ord TransactionDetails Source # 
Instance details

Defined in Proto.LndGrpc

Ord Transaction Source # 
Instance details

Defined in Proto.LndGrpc

Ord TimestampedError Source # 
Instance details

Defined in Proto.LndGrpc

Ord StopResponse Source # 
Instance details

Defined in Proto.LndGrpc

Ord StopRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord SignMessageResponse Source # 
Instance details

Defined in Proto.LndGrpc

Ord SignMessageRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord SendToRouteRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord SendResponse Source # 
Instance details

Defined in Proto.LndGrpc

Ord SendRequest'DestCustomRecordsEntry Source # 
Instance details

Defined in Proto.LndGrpc

Ord SendRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord SendManyResponse Source # 
Instance details

Defined in Proto.LndGrpc

Ord SendManyRequest'AddrToAmountEntry Source # 
Instance details

Defined in Proto.LndGrpc

Ord SendManyRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord SendCoinsResponse Source # 
Instance details

Defined in Proto.LndGrpc

Ord SendCoinsRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord RoutingPolicy Source # 
Instance details

Defined in Proto.LndGrpc

Ord RouteHint Source # 
Instance details

Defined in Proto.LndGrpc

Ord Route Source # 
Instance details

Defined in Proto.LndGrpc

Methods

compare :: Route -> Route -> Ordering #

(<) :: Route -> Route -> Bool #

(<=) :: Route -> Route -> Bool #

(>) :: Route -> Route -> Bool #

(>=) :: Route -> Route -> Bool #

max :: Route -> Route -> Route #

min :: Route -> Route -> Route #

Ord RestoreChanBackupRequest'Backup Source # 
Instance details

Defined in Proto.LndGrpc

Ord RestoreChanBackupRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord RestoreBackupResponse Source # 
Instance details

Defined in Proto.LndGrpc

Ord ResolutionType Source # 
Instance details

Defined in Proto.LndGrpc

Ord ResolutionType'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Ord ResolutionOutcome Source # 
Instance details

Defined in Proto.LndGrpc

Ord ResolutionOutcome'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Ord Resolution Source # 
Instance details

Defined in Proto.LndGrpc

Ord ReadyForPsbtFunding Source # 
Instance details

Defined in Proto.LndGrpc

Ord QueryRoutesResponse Source # 
Instance details

Defined in Proto.LndGrpc

Ord QueryRoutesRequest'DestCustomRecordsEntry Source # 
Instance details

Defined in Proto.LndGrpc

Ord QueryRoutesRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord PsbtShim Source # 
Instance details

Defined in Proto.LndGrpc

Ord PolicyUpdateResponse Source # 
Instance details

Defined in Proto.LndGrpc

Ord PolicyUpdateRequest'Scope Source # 
Instance details

Defined in Proto.LndGrpc

Ord PolicyUpdateRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord PendingUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Ord PendingHTLC Source # 
Instance details

Defined in Proto.LndGrpc

Ord PendingChannelsResponse'WaitingCloseChannel Source # 
Instance details

Defined in Proto.LndGrpc

Ord PendingChannelsResponse'PendingOpenChannel Source # 
Instance details

Defined in Proto.LndGrpc

Ord PendingChannelsResponse'PendingChannel Source # 
Instance details

Defined in Proto.LndGrpc

Ord PendingChannelsResponse'ForceClosedChannel'AnchorState Source # 
Instance details

Defined in Proto.LndGrpc

Ord PendingChannelsResponse'ForceClosedChannel'AnchorState'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Ord PendingChannelsResponse'ForceClosedChannel Source # 
Instance details

Defined in Proto.LndGrpc

Ord PendingChannelsResponse'Commitments Source # 
Instance details

Defined in Proto.LndGrpc

Ord PendingChannelsResponse'ClosedChannel Source # 
Instance details

Defined in Proto.LndGrpc

Ord PendingChannelsResponse Source # 
Instance details

Defined in Proto.LndGrpc

Ord PendingChannelsRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord PeerEventSubscription Source # 
Instance details

Defined in Proto.LndGrpc

Ord PeerEvent'EventType Source # 
Instance details

Defined in Proto.LndGrpc

Ord PeerEvent'EventType'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Ord PeerEvent Source # 
Instance details

Defined in Proto.LndGrpc

Ord Peer'SyncType Source # 
Instance details

Defined in Proto.LndGrpc

Ord Peer'SyncType'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Ord Peer'FeaturesEntry Source # 
Instance details

Defined in Proto.LndGrpc

Ord Peer Source # 
Instance details

Defined in Proto.LndGrpc

Methods

compare :: Peer -> Peer -> Ordering #

(<) :: Peer -> Peer -> Bool #

(<=) :: Peer -> Peer -> Bool #

(>) :: Peer -> Peer -> Bool #

(>=) :: Peer -> Peer -> Bool #

max :: Peer -> Peer -> Peer #

min :: Peer -> Peer -> Peer #

Ord PaymentHash Source # 
Instance details

Defined in Proto.LndGrpc

Ord PaymentFailureReason Source # 
Instance details

Defined in Proto.LndGrpc

Ord PaymentFailureReason'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Ord Payment'PaymentStatus Source # 
Instance details

Defined in Proto.LndGrpc

Ord Payment'PaymentStatus'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Ord Payment Source # 
Instance details

Defined in Proto.LndGrpc

Ord PayReqString Source # 
Instance details

Defined in Proto.LndGrpc

Ord PayReq'FeaturesEntry Source # 
Instance details

Defined in Proto.LndGrpc

Ord PayReq Source # 
Instance details

Defined in Proto.LndGrpc

Ord OutPoint Source # 
Instance details

Defined in Proto.LndGrpc

Ord OpenStatusUpdate'Update Source # 
Instance details

Defined in Proto.LndGrpc

Ord OpenStatusUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Ord OpenChannelRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord Op Source # 
Instance details

Defined in Proto.LndGrpc

Methods

compare :: Op -> Op -> Ordering #

(<) :: Op -> Op -> Bool #

(<=) :: Op -> Op -> Bool #

(>) :: Op -> Op -> Bool #

(>=) :: Op -> Op -> Bool #

max :: Op -> Op -> Op #

min :: Op -> Op -> Op #

Ord NodeUpdate'FeaturesEntry Source # 
Instance details

Defined in Proto.LndGrpc

Ord NodeUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Ord NodePair Source # 
Instance details

Defined in Proto.LndGrpc

Ord NodeMetricsResponse'BetweennessCentralityEntry Source # 
Instance details

Defined in Proto.LndGrpc

Ord NodeMetricsResponse Source # 
Instance details

Defined in Proto.LndGrpc

Ord NodeMetricsRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord NodeMetricType Source # 
Instance details

Defined in Proto.LndGrpc

Ord NodeMetricType'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Ord NodeInfoRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord NodeInfo Source # 
Instance details

Defined in Proto.LndGrpc

Ord NodeAddress Source # 
Instance details

Defined in Proto.LndGrpc

Ord NewAddressResponse Source # 
Instance details

Defined in Proto.LndGrpc

Ord NewAddressRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord NetworkInfoRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord NetworkInfo Source # 
Instance details

Defined in Proto.LndGrpc

Ord MultiChanBackup Source # 
Instance details

Defined in Proto.LndGrpc

Ord MacaroonPermissionList Source # 
Instance details

Defined in Proto.LndGrpc

Ord MacaroonPermission Source # 
Instance details

Defined in Proto.LndGrpc

Ord MacaroonId Source # 
Instance details

Defined in Proto.LndGrpc

Ord MPPRecord Source # 
Instance details

Defined in Proto.LndGrpc

Ord ListUnspentResponse Source # 
Instance details

Defined in Proto.LndGrpc

Ord ListUnspentRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord ListPermissionsResponse'MethodPermissionsEntry Source # 
Instance details

Defined in Proto.LndGrpc

Ord ListPermissionsResponse Source # 
Instance details

Defined in Proto.LndGrpc

Ord ListPermissionsRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord ListPeersResponse Source # 
Instance details

Defined in Proto.LndGrpc

Ord ListPeersRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord ListPaymentsResponse Source # 
Instance details

Defined in Proto.LndGrpc

Ord ListPaymentsRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord ListMacaroonIDsResponse Source # 
Instance details

Defined in Proto.LndGrpc

Ord ListMacaroonIDsRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord ListInvoiceResponse Source # 
Instance details

Defined in Proto.LndGrpc

Ord ListInvoiceRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord ListChannelsResponse Source # 
Instance details

Defined in Proto.LndGrpc

Ord ListChannelsRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord LightningNode'FeaturesEntry Source # 
Instance details

Defined in Proto.LndGrpc

Ord LightningNode Source # 
Instance details

Defined in Proto.LndGrpc

Ord LightningAddress Source # 
Instance details

Defined in Proto.LndGrpc

Ord KeyLocator Source # 
Instance details

Defined in Proto.LndGrpc

Ord KeyDescriptor Source # 
Instance details

Defined in Proto.LndGrpc

Ord InvoiceSubscription Source # 
Instance details

Defined in Proto.LndGrpc

Ord InvoiceHTLCState Source # 
Instance details

Defined in Proto.LndGrpc

Ord InvoiceHTLCState'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Ord InvoiceHTLC'CustomRecordsEntry Source # 
Instance details

Defined in Proto.LndGrpc

Ord InvoiceHTLC Source # 
Instance details

Defined in Proto.LndGrpc

Ord Invoice'InvoiceState Source # 
Instance details

Defined in Proto.LndGrpc

Ord Invoice'InvoiceState'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Ord Invoice'FeaturesEntry Source # 
Instance details

Defined in Proto.LndGrpc

Ord Invoice Source # 
Instance details

Defined in Proto.LndGrpc

Ord Initiator Source # 
Instance details

Defined in Proto.LndGrpc

Ord Initiator'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Ord HopHint Source # 
Instance details

Defined in Proto.LndGrpc

Ord Hop'CustomRecordsEntry Source # 
Instance details

Defined in Proto.LndGrpc

Ord Hop Source # 
Instance details

Defined in Proto.LndGrpc

Methods

compare :: Hop -> Hop -> Ordering #

(<) :: Hop -> Hop -> Bool #

(<=) :: Hop -> Hop -> Bool #

(>) :: Hop -> Hop -> Bool #

(>=) :: Hop -> Hop -> Bool #

max :: Hop -> Hop -> Hop #

min :: Hop -> Hop -> Hop #

Ord HTLCAttempt'HTLCStatus Source # 
Instance details

Defined in Proto.LndGrpc

Ord HTLCAttempt'HTLCStatus'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Ord HTLCAttempt Source # 
Instance details

Defined in Proto.LndGrpc

Ord HTLC Source # 
Instance details

Defined in Proto.LndGrpc

Methods

compare :: HTLC -> HTLC -> Ordering #

(<) :: HTLC -> HTLC -> Bool #

(<=) :: HTLC -> HTLC -> Bool #

(>) :: HTLC -> HTLC -> Bool #

(>=) :: HTLC -> HTLC -> Bool #

max :: HTLC -> HTLC -> HTLC #

min :: HTLC -> HTLC -> HTLC #

Ord GraphTopologyUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Ord GraphTopologySubscription Source # 
Instance details

Defined in Proto.LndGrpc

Ord GetTransactionsRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord GetRecoveryInfoResponse Source # 
Instance details

Defined in Proto.LndGrpc

Ord GetRecoveryInfoRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord GetInfoResponse'FeaturesEntry Source # 
Instance details

Defined in Proto.LndGrpc

Ord GetInfoResponse Source # 
Instance details

Defined in Proto.LndGrpc

Ord GetInfoRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord FundingTransitionMsg'Trigger Source # 
Instance details

Defined in Proto.LndGrpc

Ord FundingTransitionMsg Source # 
Instance details

Defined in Proto.LndGrpc

Ord FundingStateStepResp Source # 
Instance details

Defined in Proto.LndGrpc

Ord FundingShimCancel Source # 
Instance details

Defined in Proto.LndGrpc

Ord FundingShim'Shim Source # 
Instance details

Defined in Proto.LndGrpc

Ord FundingShim Source # 
Instance details

Defined in Proto.LndGrpc

Ord FundingPsbtVerify Source # 
Instance details

Defined in Proto.LndGrpc

Ord FundingPsbtFinalize Source # 
Instance details

Defined in Proto.LndGrpc

Ord ForwardingHistoryResponse Source # 
Instance details

Defined in Proto.LndGrpc

Ord ForwardingHistoryRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord ForwardingEvent Source # 
Instance details

Defined in Proto.LndGrpc

Ord FloatMetric Source # 
Instance details

Defined in Proto.LndGrpc

Ord FeeReportResponse Source # 
Instance details

Defined in Proto.LndGrpc

Ord FeeReportRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord FeeLimit'Limit Source # 
Instance details

Defined in Proto.LndGrpc

Ord FeeLimit Source # 
Instance details

Defined in Proto.LndGrpc

Ord FeatureBit Source # 
Instance details

Defined in Proto.LndGrpc

Ord FeatureBit'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Ord Feature Source # 
Instance details

Defined in Proto.LndGrpc

Ord Failure'FailureCode Source # 
Instance details

Defined in Proto.LndGrpc

Ord Failure'FailureCode'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Ord Failure Source # 
Instance details

Defined in Proto.LndGrpc

Ord ExportChannelBackupRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord EstimateFeeResponse Source # 
Instance details

Defined in Proto.LndGrpc

Ord EstimateFeeRequest'AddrToAmountEntry Source # 
Instance details

Defined in Proto.LndGrpc

Ord EstimateFeeRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord EdgeLocator Source # 
Instance details

Defined in Proto.LndGrpc

Ord DisconnectPeerResponse Source # 
Instance details

Defined in Proto.LndGrpc

Ord DisconnectPeerRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord DeleteMacaroonIDResponse Source # 
Instance details

Defined in Proto.LndGrpc

Ord DeleteMacaroonIDRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord DeleteAllPaymentsResponse Source # 
Instance details

Defined in Proto.LndGrpc

Ord DeleteAllPaymentsRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord DebugLevelResponse Source # 
Instance details

Defined in Proto.LndGrpc

Ord DebugLevelRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord ConnectPeerResponse Source # 
Instance details

Defined in Proto.LndGrpc

Ord ConnectPeerRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord ConfirmationUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Ord CommitmentType Source # 
Instance details

Defined in Proto.LndGrpc

Ord CommitmentType'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Ord ClosedChannelsResponse Source # 
Instance details

Defined in Proto.LndGrpc

Ord ClosedChannelsRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord ClosedChannelUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Ord CloseStatusUpdate'Update Source # 
Instance details

Defined in Proto.LndGrpc

Ord CloseStatusUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Ord CloseChannelRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord ChannelUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Ord ChannelPoint'FundingTxid Source # 
Instance details

Defined in Proto.LndGrpc

Ord ChannelPoint Source # 
Instance details

Defined in Proto.LndGrpc

Ord ChannelOpenUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Ord ChannelGraphRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord ChannelGraph Source # 
Instance details

Defined in Proto.LndGrpc

Ord ChannelFeeReport Source # 
Instance details

Defined in Proto.LndGrpc

Ord ChannelEventUpdate'UpdateType Source # 
Instance details

Defined in Proto.LndGrpc

Ord ChannelEventUpdate'UpdateType'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Ord ChannelEventUpdate'Channel Source # 
Instance details

Defined in Proto.LndGrpc

Ord ChannelEventUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Ord ChannelEventSubscription Source # 
Instance details

Defined in Proto.LndGrpc

Ord ChannelEdgeUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Ord ChannelEdge Source # 
Instance details

Defined in Proto.LndGrpc

Ord ChannelConstraints Source # 
Instance details

Defined in Proto.LndGrpc

Ord ChannelCloseUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Ord ChannelCloseSummary'ClosureType Source # 
Instance details

Defined in Proto.LndGrpc

Ord ChannelCloseSummary'ClosureType'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Ord ChannelCloseSummary Source # 
Instance details

Defined in Proto.LndGrpc

Ord ChannelBalanceResponse Source # 
Instance details

Defined in Proto.LndGrpc

Ord ChannelBalanceRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord ChannelBackups Source # 
Instance details

Defined in Proto.LndGrpc

Ord ChannelBackupSubscription Source # 
Instance details

Defined in Proto.LndGrpc

Ord ChannelBackup Source # 
Instance details

Defined in Proto.LndGrpc

Ord ChannelAcceptResponse Source # 
Instance details

Defined in Proto.LndGrpc

Ord ChannelAcceptRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord Channel Source # 
Instance details

Defined in Proto.LndGrpc

Ord ChanPointShim Source # 
Instance details

Defined in Proto.LndGrpc

Ord ChanInfoRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord ChanBackupSnapshot Source # 
Instance details

Defined in Proto.LndGrpc

Ord ChanBackupExportRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord Chain Source # 
Instance details

Defined in Proto.LndGrpc

Methods

compare :: Chain -> Chain -> Ordering #

(<) :: Chain -> Chain -> Bool #

(<=) :: Chain -> Chain -> Bool #

(>) :: Chain -> Chain -> Bool #

(>=) :: Chain -> Chain -> Bool #

max :: Chain -> Chain -> Chain #

min :: Chain -> Chain -> Chain #

Ord BakeMacaroonResponse Source # 
Instance details

Defined in Proto.LndGrpc

Ord BakeMacaroonRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord Amount Source # 
Instance details

Defined in Proto.LndGrpc

Ord AddressType Source # 
Instance details

Defined in Proto.LndGrpc

Ord AddressType'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Ord AddInvoiceResponse Source # 
Instance details

Defined in Proto.LndGrpc

Ord AbandonChannelResponse Source # 
Instance details

Defined in Proto.LndGrpc

Ord AbandonChannelRequest Source # 
Instance details

Defined in Proto.LndGrpc

Ord AMPRecord Source # 
Instance details

Defined in Proto.LndGrpc

Ord AMP Source # 
Instance details

Defined in Proto.LndGrpc

Methods

compare :: AMP -> AMP -> Ordering #

(<) :: AMP -> AMP -> Bool #

(<=) :: AMP -> AMP -> Bool #

(>) :: AMP -> AMP -> Bool #

(>=) :: AMP -> AMP -> Bool #

max :: AMP -> AMP -> AMP #

min :: AMP -> AMP -> AMP #

Ord SubscribeSingleInvoiceRequest Source # 
Instance details

Defined in Proto.InvoiceGrpc

Ord SettleInvoiceResp Source # 
Instance details

Defined in Proto.InvoiceGrpc

Ord SettleInvoiceMsg Source # 
Instance details

Defined in Proto.InvoiceGrpc

Ord CancelInvoiceResp Source # 
Instance details

Defined in Proto.InvoiceGrpc

Ord CancelInvoiceMsg Source # 
Instance details

Defined in Proto.InvoiceGrpc

Ord AddHoldInvoiceResp Source # 
Instance details

Defined in Proto.InvoiceGrpc

Ord AddHoldInvoiceRequest Source # 
Instance details

Defined in Proto.InvoiceGrpc

Ord Encoding 
Instance details

Defined in Basement.String

Methods

compare :: Encoding -> Encoding -> Ordering #

(<) :: Encoding -> Encoding -> Bool #

(<=) :: Encoding -> Encoding -> Bool #

(>) :: Encoding -> Encoding -> Bool #

(>=) :: Encoding -> Encoding -> Bool #

max :: Encoding -> Encoding -> Encoding #

min :: Encoding -> Encoding -> Encoding #

Ord String 
Instance details

Defined in Basement.UTF8.Base

Methods

compare :: String -> String -> Ordering #

(<) :: String -> String -> Bool #

(<=) :: String -> String -> Bool #

(>) :: String -> String -> Bool #

(>=) :: String -> String -> Bool #

max :: String -> String -> String #

min :: String -> String -> String #

Ord UTF32_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF32

Methods

compare :: UTF32_Invalid -> UTF32_Invalid -> Ordering #

(<) :: UTF32_Invalid -> UTF32_Invalid -> Bool #

(<=) :: UTF32_Invalid -> UTF32_Invalid -> Bool #

(>) :: UTF32_Invalid -> UTF32_Invalid -> Bool #

(>=) :: UTF32_Invalid -> UTF32_Invalid -> Bool #

max :: UTF32_Invalid -> UTF32_Invalid -> UTF32_Invalid #

min :: UTF32_Invalid -> UTF32_Invalid -> UTF32_Invalid #

Ord FileSize 
Instance details

Defined in Basement.Types.OffsetSize

Methods

compare :: FileSize -> FileSize -> Ordering #

(<) :: FileSize -> FileSize -> Bool #

(<=) :: FileSize -> FileSize -> Bool #

(>) :: FileSize -> FileSize -> Bool #

(>=) :: FileSize -> FileSize -> Bool #

max :: FileSize -> FileSize -> FileSize #

min :: FileSize -> FileSize -> FileSize #

Ord GrpcTimeoutSeconds Source # 
Instance details

Defined in LndClient.Data.Newtype

Ord Sat Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

compare :: Sat -> Sat -> Ordering #

(<) :: Sat -> Sat -> Bool #

(<=) :: Sat -> Sat -> Bool #

(>) :: Sat -> Sat -> Bool #

(>=) :: Sat -> Sat -> Bool #

max :: Sat -> Sat -> Sat #

min :: Sat -> Sat -> Sat #

Ord MSat Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

compare :: MSat -> MSat -> Ordering #

(<) :: MSat -> MSat -> Bool #

(<=) :: MSat -> MSat -> Bool #

(>) :: MSat -> MSat -> Bool #

(>=) :: MSat -> MSat -> Bool #

max :: MSat -> MSat -> MSat #

min :: MSat -> MSat -> MSat #

Ord RPreimage Source # 
Instance details

Defined in LndClient.Data.Newtype

Ord RHash Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

compare :: RHash -> RHash -> Ordering #

(<) :: RHash -> RHash -> Bool #

(<=) :: RHash -> RHash -> Bool #

(>) :: RHash -> RHash -> Bool #

(>=) :: RHash -> RHash -> Bool #

max :: RHash -> RHash -> RHash #

min :: RHash -> RHash -> RHash #

Ord SettleIndex Source # 
Instance details

Defined in LndClient.Data.Newtype

Ord AddIndex Source # 
Instance details

Defined in LndClient.Data.Newtype

Ord NodeLocation Source # 
Instance details

Defined in LndClient.Data.Newtype

Ord NodePubKey Source # 
Instance details

Defined in LndClient.Data.Newtype

Ord ASN1CharacterString 
Instance details

Defined in Data.ASN1.Types.String

Methods

compare :: ASN1CharacterString -> ASN1CharacterString -> Ordering #

(<) :: ASN1CharacterString -> ASN1CharacterString -> Bool #

(<=) :: ASN1CharacterString -> ASN1CharacterString -> Bool #

(>) :: ASN1CharacterString -> ASN1CharacterString -> Bool #

(>=) :: ASN1CharacterString -> ASN1CharacterString -> Bool #

max :: ASN1CharacterString -> ASN1CharacterString -> ASN1CharacterString #

min :: ASN1CharacterString -> ASN1CharacterString -> ASN1CharacterString #

Ord DistinguishedName 
Instance details

Defined in Data.X509.DistinguishedName

Methods

compare :: DistinguishedName -> DistinguishedName -> Ordering #

(<) :: DistinguishedName -> DistinguishedName -> Bool #

(<=) :: DistinguishedName -> DistinguishedName -> Bool #

(>) :: DistinguishedName -> DistinguishedName -> Bool #

(>=) :: DistinguishedName -> DistinguishedName -> Bool #

max :: DistinguishedName -> DistinguishedName -> DistinguishedName #

min :: DistinguishedName -> DistinguishedName -> DistinguishedName #

Ord AltName 
Instance details

Defined in Data.X509.Ext

Methods

compare :: AltName -> AltName -> Ordering #

(<) :: AltName -> AltName -> Bool #

(<=) :: AltName -> AltName -> Bool #

(>) :: AltName -> AltName -> Bool #

(>=) :: AltName -> AltName -> Bool #

max :: AltName -> AltName -> AltName #

min :: AltName -> AltName -> AltName #

Ord ExtKeyUsageFlag 
Instance details

Defined in Data.X509.Ext

Methods

compare :: ExtKeyUsageFlag -> ExtKeyUsageFlag -> Ordering #

(<) :: ExtKeyUsageFlag -> ExtKeyUsageFlag -> Bool #

(<=) :: ExtKeyUsageFlag -> ExtKeyUsageFlag -> Bool #

(>) :: ExtKeyUsageFlag -> ExtKeyUsageFlag -> Bool #

(>=) :: ExtKeyUsageFlag -> ExtKeyUsageFlag -> Bool #

max :: ExtKeyUsageFlag -> ExtKeyUsageFlag -> ExtKeyUsageFlag #

min :: ExtKeyUsageFlag -> ExtKeyUsageFlag -> ExtKeyUsageFlag #

Ord ExtKeyUsagePurpose 
Instance details

Defined in Data.X509.Ext

Methods

compare :: ExtKeyUsagePurpose -> ExtKeyUsagePurpose -> Ordering #

(<) :: ExtKeyUsagePurpose -> ExtKeyUsagePurpose -> Bool #

(<=) :: ExtKeyUsagePurpose -> ExtKeyUsagePurpose -> Bool #

(>) :: ExtKeyUsagePurpose -> ExtKeyUsagePurpose -> Bool #

(>=) :: ExtKeyUsagePurpose -> ExtKeyUsagePurpose -> Bool #

max :: ExtKeyUsagePurpose -> ExtKeyUsagePurpose -> ExtKeyUsagePurpose #

min :: ExtKeyUsagePurpose -> ExtKeyUsagePurpose -> ExtKeyUsagePurpose #

Ord ExtSubjectAltName 
Instance details

Defined in Data.X509.Ext

Methods

compare :: ExtSubjectAltName -> ExtSubjectAltName -> Ordering #

(<) :: ExtSubjectAltName -> ExtSubjectAltName -> Bool #

(<=) :: ExtSubjectAltName -> ExtSubjectAltName -> Bool #

(>) :: ExtSubjectAltName -> ExtSubjectAltName -> Bool #

(>=) :: ExtSubjectAltName -> ExtSubjectAltName -> Bool #

max :: ExtSubjectAltName -> ExtSubjectAltName -> ExtSubjectAltName #

min :: ExtSubjectAltName -> ExtSubjectAltName -> ExtSubjectAltName #

Ord ReasonFlag 
Instance details

Defined in Data.X509.Ext

Methods

compare :: ReasonFlag -> ReasonFlag -> Ordering #

(<) :: ReasonFlag -> ReasonFlag -> Bool #

(<=) :: ReasonFlag -> ReasonFlag -> Bool #

(>) :: ReasonFlag -> ReasonFlag -> Bool #

(>=) :: ReasonFlag -> ReasonFlag -> Bool #

max :: ReasonFlag -> ReasonFlag -> ReasonFlag #

min :: ReasonFlag -> ReasonFlag -> ReasonFlag #

Ord PortNumber 
Instance details

Defined in Network.Socket.Types

Methods

compare :: PortNumber -> PortNumber -> Ordering #

(<) :: PortNumber -> PortNumber -> Bool #

(<=) :: PortNumber -> PortNumber -> Bool #

(>) :: PortNumber -> PortNumber -> Bool #

(>=) :: PortNumber -> PortNumber -> Bool #

max :: PortNumber -> PortNumber -> PortNumber #

min :: PortNumber -> PortNumber -> PortNumber #

Ord ErrorCodeId 
Instance details

Defined in Network.HTTP2.Types

Methods

compare :: ErrorCodeId -> ErrorCodeId -> Ordering #

(<) :: ErrorCodeId -> ErrorCodeId -> Bool #

(<=) :: ErrorCodeId -> ErrorCodeId -> Bool #

(>) :: ErrorCodeId -> ErrorCodeId -> Bool #

(>=) :: ErrorCodeId -> ErrorCodeId -> Bool #

max :: ErrorCodeId -> ErrorCodeId -> ErrorCodeId #

min :: ErrorCodeId -> ErrorCodeId -> ErrorCodeId #

Ord Family 
Instance details

Defined in Network.Socket.Types

Methods

compare :: Family -> Family -> Ordering #

(<) :: Family -> Family -> Bool #

(<=) :: Family -> Family -> Bool #

(>) :: Family -> Family -> Bool #

(>=) :: Family -> Family -> Bool #

max :: Family -> Family -> Family #

min :: Family -> Family -> Family #

Ord SockAddr 
Instance details

Defined in Network.Socket.Types

Methods

compare :: SockAddr -> SockAddr -> Ordering #

(<) :: SockAddr -> SockAddr -> Bool #

(<=) :: SockAddr -> SockAddr -> Bool #

(>) :: SockAddr -> SockAddr -> Bool #

(>=) :: SockAddr -> SockAddr -> Bool #

max :: SockAddr -> SockAddr -> SockAddr #

min :: SockAddr -> SockAddr -> SockAddr #

Ord SocketType 
Instance details

Defined in Network.Socket.Types

Methods

compare :: SocketType -> SocketType -> Ordering #

(<) :: SocketType -> SocketType -> Bool #

(<=) :: SocketType -> SocketType -> Bool #

(>) :: SocketType -> SocketType -> Bool #

(>=) :: SocketType -> SocketType -> Bool #

max :: SocketType -> SocketType -> SocketType #

min :: SocketType -> SocketType -> SocketType #

Ord GRPCStatus 
Instance details

Defined in Network.GRPC.HTTP2.Types

Methods

compare :: GRPCStatus -> GRPCStatus -> Ordering #

(<) :: GRPCStatus -> GRPCStatus -> Bool #

(<=) :: GRPCStatus -> GRPCStatus -> Bool #

(>) :: GRPCStatus -> GRPCStatus -> Bool #

(>=) :: GRPCStatus -> GRPCStatus -> Bool #

max :: GRPCStatus -> GRPCStatus -> GRPCStatus #

min :: GRPCStatus -> GRPCStatus -> GRPCStatus #

Ord GRPCStatusCode 
Instance details

Defined in Network.GRPC.HTTP2.Types

Methods

compare :: GRPCStatusCode -> GRPCStatusCode -> Ordering #

(<) :: GRPCStatusCode -> GRPCStatusCode -> Bool #

(<=) :: GRPCStatusCode -> GRPCStatusCode -> Bool #

(>) :: GRPCStatusCode -> GRPCStatusCode -> Bool #

(>=) :: GRPCStatusCode -> GRPCStatusCode -> Bool #

max :: GRPCStatusCode -> GRPCStatusCode -> GRPCStatusCode #

min :: GRPCStatusCode -> GRPCStatusCode -> GRPCStatusCode #

Ord InvalidGRPCStatus 
Instance details

Defined in Network.GRPC.HTTP2.Types

Methods

compare :: InvalidGRPCStatus -> InvalidGRPCStatus -> Ordering #

(<) :: InvalidGRPCStatus -> InvalidGRPCStatus -> Bool #

(<=) :: InvalidGRPCStatus -> InvalidGRPCStatus -> Bool #

(>) :: InvalidGRPCStatus -> InvalidGRPCStatus -> Bool #

(>=) :: InvalidGRPCStatus -> InvalidGRPCStatus -> Bool #

max :: InvalidGRPCStatus -> InvalidGRPCStatus -> InvalidGRPCStatus #

min :: InvalidGRPCStatus -> InvalidGRPCStatus -> InvalidGRPCStatus #

Ord ASN1TimeType 
Instance details

Defined in Data.ASN1.Types

Methods

compare :: ASN1TimeType -> ASN1TimeType -> Ordering #

(<) :: ASN1TimeType -> ASN1TimeType -> Bool #

(<=) :: ASN1TimeType -> ASN1TimeType -> Bool #

(>) :: ASN1TimeType -> ASN1TimeType -> Bool #

(>=) :: ASN1TimeType -> ASN1TimeType -> Bool #

max :: ASN1TimeType -> ASN1TimeType -> ASN1TimeType #

min :: ASN1TimeType -> ASN1TimeType -> ASN1TimeType #

Ord ASN1StringEncoding 
Instance details

Defined in Data.ASN1.Types.String

Methods

compare :: ASN1StringEncoding -> ASN1StringEncoding -> Ordering #

(<) :: ASN1StringEncoding -> ASN1StringEncoding -> Bool #

(<=) :: ASN1StringEncoding -> ASN1StringEncoding -> Bool #

(>) :: ASN1StringEncoding -> ASN1StringEncoding -> Bool #

(>=) :: ASN1StringEncoding -> ASN1StringEncoding -> Bool #

max :: ASN1StringEncoding -> ASN1StringEncoding -> ASN1StringEncoding #

min :: ASN1StringEncoding -> ASN1StringEncoding -> ASN1StringEncoding #

Ord FrameTypeId 
Instance details

Defined in Network.HTTP2.Types

Methods

compare :: FrameTypeId -> FrameTypeId -> Ordering #

(<) :: FrameTypeId -> FrameTypeId -> Bool #

(<=) :: FrameTypeId -> FrameTypeId -> Bool #

(>) :: FrameTypeId -> FrameTypeId -> Bool #

(>=) :: FrameTypeId -> FrameTypeId -> Bool #

max :: FrameTypeId -> FrameTypeId -> FrameTypeId #

min :: FrameTypeId -> FrameTypeId -> FrameTypeId #

Ord SettingsKeyId 
Instance details

Defined in Network.HTTP2.Types

Methods

compare :: SettingsKeyId -> SettingsKeyId -> Ordering #

(<) :: SettingsKeyId -> SettingsKeyId -> Bool #

(<=) :: SettingsKeyId -> SettingsKeyId -> Bool #

(>) :: SettingsKeyId -> SettingsKeyId -> Bool #

(>=) :: SettingsKeyId -> SettingsKeyId -> Bool #

max :: SettingsKeyId -> SettingsKeyId -> SettingsKeyId #

min :: SettingsKeyId -> SettingsKeyId -> SettingsKeyId #

Ord HIndex 
Instance details

Defined in Network.HPACK.Types

Methods

compare :: HIndex -> HIndex -> Ordering #

(<) :: HIndex -> HIndex -> Bool #

(<=) :: HIndex -> HIndex -> Bool #

(>) :: HIndex -> HIndex -> Bool #

(>=) :: HIndex -> HIndex -> Bool #

max :: HIndex -> HIndex -> HIndex #

min :: HIndex -> HIndex -> HIndex #

Ord SubscribeInvoicesRequest Source # 
Instance details

Defined in LndClient.Data.SubscribeInvoices

Ord ClosedChannelsRequest Source # 
Instance details

Defined in LndClient.Data.ClosedChannels

Ord ChannelPoint Source # 
Instance details

Defined in LndClient.Data.ChannelPoint

Ord Channel Source # 
Instance details

Defined in LndClient.Data.Channel

Ord ChannelCloseSummary Source # 
Instance details

Defined in LndClient.Data.CloseChannel

Ord ChannelCloseUpdate Source # 
Instance details

Defined in LndClient.Data.CloseChannel

Ord CloseStatusUpdate Source # 
Instance details

Defined in LndClient.Data.CloseChannel

Ord CloseChannelRequest Source # 
Instance details

Defined in LndClient.Data.CloseChannel

Ord UpdateChannel Source # 
Instance details

Defined in LndClient.Data.SubscribeChannelEvents

Ord ChannelEventUpdate Source # 
Instance details

Defined in LndClient.Data.SubscribeChannelEvents

Ord XImportMissionControlResponse Source # 
Instance details

Defined in Proto.RouterGrpc

Ord XImportMissionControlRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Ord UpdateChanStatusResponse Source # 
Instance details

Defined in Proto.RouterGrpc

Ord UpdateChanStatusRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Ord TrackPaymentRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Ord SubscribeHtlcEventsRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Ord SettleEvent Source # 
Instance details

Defined in Proto.RouterGrpc

Ord SetMissionControlConfigResponse Source # 
Instance details

Defined in Proto.RouterGrpc

Ord SetMissionControlConfigRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Ord SendToRouteResponse Source # 
Instance details

Defined in Proto.RouterGrpc

Ord SendToRouteRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Ord SendPaymentRequest'DestCustomRecordsEntry Source # 
Instance details

Defined in Proto.RouterGrpc

Ord SendPaymentRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Ord RouteFeeResponse Source # 
Instance details

Defined in Proto.RouterGrpc

Ord RouteFeeRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Ord ResolveHoldForwardAction Source # 
Instance details

Defined in Proto.RouterGrpc

Ord ResolveHoldForwardAction'UnrecognizedValue Source # 
Instance details

Defined in Proto.RouterGrpc

Ord ResetMissionControlResponse Source # 
Instance details

Defined in Proto.RouterGrpc

Ord ResetMissionControlRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Ord QueryProbabilityResponse Source # 
Instance details

Defined in Proto.RouterGrpc

Ord QueryProbabilityRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Ord QueryMissionControlResponse Source # 
Instance details

Defined in Proto.RouterGrpc

Ord QueryMissionControlRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Ord PaymentStatus Source # 
Instance details

Defined in Proto.RouterGrpc

Ord PaymentState Source # 
Instance details

Defined in Proto.RouterGrpc

Ord PaymentState'UnrecognizedValue Source # 
Instance details

Defined in Proto.RouterGrpc

Ord PairHistory Source # 
Instance details

Defined in Proto.RouterGrpc

Ord PairData Source # 
Instance details

Defined in Proto.RouterGrpc

Ord MissionControlConfig Source # 
Instance details

Defined in Proto.RouterGrpc

Ord LinkFailEvent Source # 
Instance details

Defined in Proto.RouterGrpc

Ord HtlcInfo Source # 
Instance details

Defined in Proto.RouterGrpc

Ord HtlcEvent'EventType Source # 
Instance details

Defined in Proto.RouterGrpc

Ord HtlcEvent'EventType'UnrecognizedValue Source # 
Instance details

Defined in Proto.RouterGrpc

Ord HtlcEvent'Event Source # 
Instance details

Defined in Proto.RouterGrpc

Ord HtlcEvent Source # 
Instance details

Defined in Proto.RouterGrpc

Ord GetMissionControlConfigResponse Source # 
Instance details

Defined in Proto.RouterGrpc

Ord GetMissionControlConfigRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Ord ForwardHtlcInterceptResponse Source # 
Instance details

Defined in Proto.RouterGrpc

Ord ForwardHtlcInterceptRequest'CustomRecordsEntry Source # 
Instance details

Defined in Proto.RouterGrpc

Ord ForwardHtlcInterceptRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Ord ForwardFailEvent Source # 
Instance details

Defined in Proto.RouterGrpc

Ord ForwardEvent Source # 
Instance details

Defined in Proto.RouterGrpc

Ord FailureDetail Source # 
Instance details

Defined in Proto.RouterGrpc

Ord FailureDetail'UnrecognizedValue Source # 
Instance details

Defined in Proto.RouterGrpc

Ord CircuitKey Source # 
Instance details

Defined in Proto.RouterGrpc

Ord ChanStatusAction Source # 
Instance details

Defined in Proto.RouterGrpc

Ord ChanStatusAction'UnrecognizedValue Source # 
Instance details

Defined in Proto.RouterGrpc

Ord BuildRouteResponse Source # 
Instance details

Defined in Proto.RouterGrpc

Ord BuildRouteRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Ord TrackPaymentRequest Source # 
Instance details

Defined in LndClient.Data.TrackPayment

Ord UnlockWalletResponse Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Ord UnlockWalletRequest Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Ord InitWalletResponse Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Ord InitWalletRequest Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Ord GenSeedResponse Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Ord GenSeedRequest Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Ord ChangePasswordResponse Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Ord ChangePasswordRequest Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Ord Block 
Instance details

Defined in Network.Bitcoin.BlockChain

Methods

compare :: Block -> Block -> Ordering #

(<) :: Block -> Block -> Bool #

(<=) :: Block -> Block -> Bool #

(>) :: Block -> Block -> Bool #

(>=) :: Block -> Block -> Bool #

max :: Block -> Block -> Block #

min :: Block -> Block -> Block #

Ord OutputInfo 
Instance details

Defined in Network.Bitcoin.BlockChain

Methods

compare :: OutputInfo -> OutputInfo -> Ordering #

(<) :: OutputInfo -> OutputInfo -> Bool #

(<=) :: OutputInfo -> OutputInfo -> Bool #

(>) :: OutputInfo -> OutputInfo -> Bool #

(>=) :: OutputInfo -> OutputInfo -> Bool #

max :: OutputInfo -> OutputInfo -> OutputInfo #

min :: OutputInfo -> OutputInfo -> OutputInfo #

Ord OutputSetInfo 
Instance details

Defined in Network.Bitcoin.BlockChain

Methods

compare :: OutputSetInfo -> OutputSetInfo -> Ordering #

(<) :: OutputSetInfo -> OutputSetInfo -> Bool #

(<=) :: OutputSetInfo -> OutputSetInfo -> Bool #

(>) :: OutputSetInfo -> OutputSetInfo -> Bool #

(>=) :: OutputSetInfo -> OutputSetInfo -> Bool #

max :: OutputSetInfo -> OutputSetInfo -> OutputSetInfo #

min :: OutputSetInfo -> OutputSetInfo -> OutputSetInfo #

Ord BlockTemplate 
Instance details

Defined in Network.Bitcoin.Mining

Methods

compare :: BlockTemplate -> BlockTemplate -> Ordering #

(<) :: BlockTemplate -> BlockTemplate -> Bool #

(<=) :: BlockTemplate -> BlockTemplate -> Bool #

(>) :: BlockTemplate -> BlockTemplate -> Bool #

(>=) :: BlockTemplate -> BlockTemplate -> Bool #

max :: BlockTemplate -> BlockTemplate -> BlockTemplate #

min :: BlockTemplate -> BlockTemplate -> BlockTemplate #

Ord CoinBaseAux 
Instance details

Defined in Network.Bitcoin.Mining

Methods

compare :: CoinBaseAux -> CoinBaseAux -> Ordering #

(<) :: CoinBaseAux -> CoinBaseAux -> Bool #

(<=) :: CoinBaseAux -> CoinBaseAux -> Bool #

(>) :: CoinBaseAux -> CoinBaseAux -> Bool #

(>=) :: CoinBaseAux -> CoinBaseAux -> Bool #

max :: CoinBaseAux -> CoinBaseAux -> CoinBaseAux #

min :: CoinBaseAux -> CoinBaseAux -> CoinBaseAux #

Ord HashData 
Instance details

Defined in Network.Bitcoin.Mining

Methods

compare :: HashData -> HashData -> Ordering #

(<) :: HashData -> HashData -> Bool #

(<=) :: HashData -> HashData -> Bool #

(>) :: HashData -> HashData -> Bool #

(>=) :: HashData -> HashData -> Bool #

max :: HashData -> HashData -> HashData #

min :: HashData -> HashData -> HashData #

Ord MiningInfo 
Instance details

Defined in Network.Bitcoin.Mining

Methods

compare :: MiningInfo -> MiningInfo -> Ordering #

(<) :: MiningInfo -> MiningInfo -> Bool #

(<=) :: MiningInfo -> MiningInfo -> Bool #

(>) :: MiningInfo -> MiningInfo -> Bool #

(>=) :: MiningInfo -> MiningInfo -> Bool #

max :: MiningInfo -> MiningInfo -> MiningInfo #

min :: MiningInfo -> MiningInfo -> MiningInfo #

Ord Transaction 
Instance details

Defined in Network.Bitcoin.Mining

Methods

compare :: Transaction -> Transaction -> Ordering #

(<) :: Transaction -> Transaction -> Bool #

(<=) :: Transaction -> Transaction -> Bool #

(>) :: Transaction -> Transaction -> Bool #

(>=) :: Transaction -> Transaction -> Bool #

max :: Transaction -> Transaction -> Transaction #

min :: Transaction -> Transaction -> Transaction #

Ord BitcoinException 
Instance details

Defined in Network.Bitcoin.Types

Methods

compare :: BitcoinException -> BitcoinException -> Ordering #

(<) :: BitcoinException -> BitcoinException -> Bool #

(<=) :: BitcoinException -> BitcoinException -> Bool #

(>) :: BitcoinException -> BitcoinException -> Bool #

(>=) :: BitcoinException -> BitcoinException -> Bool #

max :: BitcoinException -> BitcoinException -> BitcoinException #

min :: BitcoinException -> BitcoinException -> BitcoinException #

Ord URIAuth 
Instance details

Defined in Network.URI

Methods

compare :: URIAuth -> URIAuth -> Ordering #

(<) :: URIAuth -> URIAuth -> Bool #

(<=) :: URIAuth -> URIAuth -> Bool #

(>) :: URIAuth -> URIAuth -> Bool #

(>=) :: URIAuth -> URIAuth -> Bool #

max :: URIAuth -> URIAuth -> URIAuth #

min :: URIAuth -> URIAuth -> URIAuth #

Ord 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 Cookie 
Instance details

Defined in Network.HTTP.Client.Types

Methods

compare :: Cookie -> Cookie -> Ordering #

(<) :: Cookie -> Cookie -> Bool #

(<=) :: Cookie -> Cookie -> Bool #

(>) :: Cookie -> Cookie -> Bool #

(>=) :: Cookie -> Cookie -> Bool #

max :: Cookie -> Cookie -> Cookie #

min :: Cookie -> Cookie -> Cookie #

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 StreamFileStatus 
Instance details

Defined in Network.HTTP.Client.Types

Methods

compare :: StreamFileStatus -> StreamFileStatus -> Ordering #

(<) :: StreamFileStatus -> StreamFileStatus -> Bool #

(<=) :: StreamFileStatus -> StreamFileStatus -> Bool #

(>) :: StreamFileStatus -> StreamFileStatus -> Bool #

(>=) :: StreamFileStatus -> StreamFileStatus -> Bool #

max :: StreamFileStatus -> StreamFileStatus -> StreamFileStatus #

min :: StreamFileStatus -> StreamFileStatus -> StreamFileStatus #

Ord ConnHost 
Instance details

Defined in Network.HTTP.Client.Types

Methods

compare :: ConnHost -> ConnHost -> Ordering #

(<) :: ConnHost -> ConnHost -> Bool #

(<=) :: ConnHost -> ConnHost -> Bool #

(>) :: ConnHost -> ConnHost -> Bool #

(>=) :: ConnHost -> ConnHost -> Bool #

max :: ConnHost -> ConnHost -> ConnHost #

min :: ConnHost -> ConnHost -> ConnHost #

Ord ConnKey 
Instance details

Defined in Network.HTTP.Client.Types

Methods

compare :: ConnKey -> ConnKey -> Ordering #

(<) :: ConnKey -> ConnKey -> Bool #

(<=) :: ConnKey -> ConnKey -> Bool #

(>) :: ConnKey -> ConnKey -> Bool #

(>=) :: ConnKey -> ConnKey -> Bool #

max :: ConnKey -> ConnKey -> ConnKey #

min :: ConnKey -> ConnKey -> ConnKey #

Ord StatusHeaders 
Instance details

Defined in Network.HTTP.Client.Types

Methods

compare :: StatusHeaders -> StatusHeaders -> Ordering #

(<) :: StatusHeaders -> StatusHeaders -> Bool #

(<=) :: StatusHeaders -> StatusHeaders -> Bool #

(>) :: StatusHeaders -> StatusHeaders -> Bool #

(>=) :: StatusHeaders -> StatusHeaders -> Bool #

max :: StatusHeaders -> StatusHeaders -> StatusHeaders #

min :: StatusHeaders -> StatusHeaders -> StatusHeaders #

Ord BitcoinRpcError 
Instance details

Defined in Network.Bitcoin.Internal

Methods

compare :: BitcoinRpcError -> BitcoinRpcError -> Ordering #

(<) :: BitcoinRpcError -> BitcoinRpcError -> Bool #

(<=) :: BitcoinRpcError -> BitcoinRpcError -> Bool #

(>) :: BitcoinRpcError -> BitcoinRpcError -> Bool #

(>=) :: BitcoinRpcError -> BitcoinRpcError -> Bool #

max :: BitcoinRpcError -> BitcoinRpcError -> BitcoinRpcError #

min :: BitcoinRpcError -> BitcoinRpcError -> BitcoinRpcError #

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 (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 #

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 (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 #

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 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 (ForeignPtr a)

Since: base-2.1

Instance details

Defined in GHC.ForeignPtr

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 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 (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 m => Ord (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Ord a => Ord (Option a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

compare :: Option a -> Option a -> Ordering #

(<) :: Option a -> Option a -> Bool #

(<=) :: Option a -> Option a -> Bool #

(>) :: Option a -> Option a -> Bool #

(>=) :: Option a -> Option a -> Bool #

max :: Option a -> Option a -> Option a #

min :: Option a -> Option a -> Option 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 (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 (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 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 (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 (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 (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 (MeridiemLocale a) 
Instance details

Defined in Chronos

Methods

compare :: MeridiemLocale a -> MeridiemLocale a -> Ordering #

(<) :: MeridiemLocale a -> MeridiemLocale a -> Bool #

(<=) :: MeridiemLocale a -> MeridiemLocale a -> Bool #

(>) :: MeridiemLocale a -> MeridiemLocale a -> Bool #

(>=) :: MeridiemLocale a -> MeridiemLocale a -> Bool #

max :: MeridiemLocale a -> MeridiemLocale a -> MeridiemLocale a #

min :: MeridiemLocale a -> MeridiemLocale a -> MeridiemLocale 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 #

Ord (Encoding' a) 
Instance details

Defined in Data.Aeson.Encoding.Internal

Methods

compare :: Encoding' a -> Encoding' a -> Ordering #

(<) :: Encoding' a -> Encoding' a -> Bool #

(<=) :: Encoding' a -> Encoding' a -> Bool #

(>) :: Encoding' a -> Encoding' a -> Bool #

(>=) :: Encoding' a -> Encoding' a -> Bool #

max :: Encoding' a -> Encoding' a -> Encoding' a #

min :: Encoding' a -> Encoding' a -> Encoding' a #

(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 #

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 (Key record), Ord record) => Ord (Entity record) 
Instance details

Defined in Database.Persist.Class.PersistEntity

Methods

compare :: Entity record -> Entity record -> Ordering #

(<) :: Entity record -> Entity record -> Bool #

(<=) :: Entity record -> Entity record -> Bool #

(>) :: Entity record -> Entity record -> Bool #

(>=) :: Entity record -> Entity record -> Bool #

max :: Entity record -> Entity record -> Entity record #

min :: Entity record -> Entity record -> Entity record #

Ord a => Ord (HashSet a) 
Instance details

Defined in Data.HashSet.Base

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 (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 (DList a) 
Instance details

Defined in Data.DList

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 #

(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 (Array a) 
Instance details

Defined in Data.Primitive.Array

Methods

compare :: Array a -> Array a -> Ordering #

(<) :: Array a -> Array a -> Bool #

(<=) :: Array a -> Array a -> Bool #

(>) :: Array a -> Array a -> Bool #

(>=) :: Array a -> Array a -> Bool #

max :: Array a -> Array a -> Array a #

min :: Array a -> Array a -> Array a #

(Ord a, Prim a) => Ord (PrimArray a) 
Instance details

Defined in Data.Primitive.PrimArray

Methods

compare :: PrimArray a -> PrimArray a -> Ordering #

(<) :: PrimArray a -> PrimArray a -> Bool #

(<=) :: PrimArray a -> PrimArray a -> Bool #

(>) :: PrimArray a -> PrimArray a -> Bool #

(>=) :: PrimArray a -> PrimArray a -> Bool #

max :: PrimArray a -> PrimArray a -> PrimArray a #

min :: PrimArray a -> PrimArray a -> PrimArray a #

Ord a => Ord (SmallArray a) 
Instance details

Defined in Data.Primitive.SmallArray

Methods

compare :: SmallArray a -> SmallArray a -> Ordering #

(<) :: SmallArray a -> SmallArray a -> Bool #

(<=) :: SmallArray a -> SmallArray a -> Bool #

(>) :: SmallArray a -> SmallArray a -> Bool #

(>=) :: SmallArray a -> SmallArray a -> Bool #

max :: SmallArray a -> SmallArray a -> SmallArray a #

min :: SmallArray a -> SmallArray a -> SmallArray a #

(Ord a, PrimUnlifted a) => Ord (UnliftedArray a) 
Instance details

Defined in Data.Primitive.UnliftedArray

Methods

compare :: UnliftedArray a -> UnliftedArray a -> Ordering #

(<) :: UnliftedArray a -> UnliftedArray a -> Bool #

(<=) :: UnliftedArray a -> UnliftedArray a -> Bool #

(>) :: UnliftedArray a -> UnliftedArray a -> Bool #

(>=) :: UnliftedArray a -> UnliftedArray a -> Bool #

max :: UnliftedArray a -> UnliftedArray a -> UnliftedArray a #

min :: UnliftedArray a -> UnliftedArray a -> UnliftedArray 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 (Result a) 
Instance details

Defined in Codec.QRCode.Data.Result

Methods

compare :: Result a -> Result a -> Ordering #

(<) :: Result a -> Result a -> Bool #

(<=) :: Result a -> Result a -> Bool #

(>) :: Result a -> Result a -> Bool #

(>=) :: Result a -> Result a -> Bool #

max :: Result a -> Result a -> Result a #

min :: Result a -> Result a -> Result a #

Ord s => Ord (CI s) 
Instance details

Defined in Data.CaseInsensitive.Internal

Methods

compare :: CI s -> CI s -> Ordering #

(<) :: CI s -> CI s -> Bool #

(<=) :: CI s -> CI s -> Bool #

(>) :: CI s -> CI s -> Bool #

(>=) :: CI s -> CI s -> Bool #

max :: CI s -> CI s -> CI s #

min :: CI s -> CI s -> CI s #

(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 (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 #

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 #

(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 (TxId a) Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

compare :: TxId a -> TxId a -> Ordering #

(<) :: TxId a -> TxId a -> Bool #

(<=) :: TxId a -> TxId a -> Bool #

(>) :: TxId a -> TxId a -> Bool #

(>=) :: TxId a -> TxId a -> Bool #

max :: TxId a -> TxId a -> TxId a #

min :: TxId a -> TxId a -> TxId a #

Ord (Vout a) Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

compare :: Vout a -> Vout a -> Ordering #

(<) :: Vout a -> Vout a -> Bool #

(<=) :: Vout a -> Vout a -> Bool #

(>) :: Vout a -> Vout a -> Bool #

(>=) :: Vout a -> Vout a -> Bool #

max :: Vout a -> Vout a -> Vout a #

min :: Vout a -> Vout a -> Vout a #

Ord (Digest a) 
Instance details

Defined in Crypto.Hash.Types

Methods

compare :: Digest a -> Digest a -> Ordering #

(<) :: Digest a -> Digest a -> Bool #

(<=) :: Digest a -> Digest a -> Bool #

(>) :: Digest a -> Digest a -> Bool #

(>=) :: Digest a -> Digest a -> Bool #

max :: Digest a -> Digest a -> Digest a #

min :: Digest a -> Digest a -> Digest a #

Ord (PendingUpdate a) Source # 
Instance details

Defined in LndClient.Data.Channel

Ord a => Ord (BitcoinRpcResponse a) 
Instance details

Defined in Network.Bitcoin.Internal

Methods

compare :: BitcoinRpcResponse a -> BitcoinRpcResponse a -> Ordering #

(<) :: BitcoinRpcResponse a -> BitcoinRpcResponse a -> Bool #

(<=) :: BitcoinRpcResponse a -> BitcoinRpcResponse a -> Bool #

(>) :: BitcoinRpcResponse a -> BitcoinRpcResponse a -> Bool #

(>=) :: BitcoinRpcResponse a -> BitcoinRpcResponse a -> Bool #

max :: BitcoinRpcResponse a -> BitcoinRpcResponse a -> BitcoinRpcResponse a #

min :: BitcoinRpcResponse a -> BitcoinRpcResponse a -> BitcoinRpcResponse 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 (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 (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 (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 #

(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 (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 (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 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 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) 
Instance details

Defined in Data.HashMap.Base

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 (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 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) #

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 #

(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 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 #

(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 #

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 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 (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 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 (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 (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 (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 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) #

(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 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 (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 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 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 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 (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 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 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 (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 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
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 Int8

Since: base-2.1

Instance details

Defined in GHC.Int

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 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 Ordering

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 Word8

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 ()

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS () #

readList :: ReadS [()] #

readPrec :: ReadPrec () #

readListPrec :: ReadPrec [()] #

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 Version

Since: base-2.1

Instance details

Defined in Data.Version

Read CDev 
Instance details

Defined in System.Posix.Types

Read CIno 
Instance details

Defined in System.Posix.Types

Read CMode 
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 CSsize 
Instance details

Defined in System.Posix.Types

Read CGid 
Instance details

Defined in System.Posix.Types

Read CNlink 
Instance details

Defined in System.Posix.Types

Read CUid 
Instance details

Defined in System.Posix.Types

Read CCc 
Instance details

Defined in System.Posix.Types

Read CSpeed 
Instance details

Defined in System.Posix.Types

Read CTcflag 
Instance details

Defined in System.Posix.Types

Read CRLim 
Instance details

Defined in System.Posix.Types

Read CBlkSize 
Instance details

Defined in System.Posix.Types

Read CBlkCnt 
Instance details

Defined in System.Posix.Types

Read CClockId 
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 CId 
Instance details

Defined in System.Posix.Types

Read CKey 
Instance details

Defined in System.Posix.Types

Read Fd 
Instance details

Defined in System.Posix.Types

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 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 Fixity

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Read Associativity

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Read SourceUnpackedness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Read SourceStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Read DecidedStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

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 IOMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.IOMode

Read Lexeme

Since: base-2.1

Instance details

Defined in GHC.Read

Read GeneralCategory

Since: base-2.1

Instance details

Defined in GHC.Read

Read ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Read ByteString 
Instance details

Defined in Data.ByteString.Internal

Read IntSet 
Instance details

Defined in Data.IntSet.Internal

Read FPFormat 
Instance details

Defined in Data.Text.Lazy.Builder.RealFloat

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 Date 
Instance details

Defined in Chronos

Methods

readsPrec :: Int -> ReadS Date #

readList :: ReadS [Date] #

readPrec :: ReadPrec Date #

readListPrec :: ReadPrec [Date] #

Read Datetime 
Instance details

Defined in Chronos

Methods

readsPrec :: Int -> ReadS Datetime #

readList :: ReadS [Datetime] #

readPrec :: ReadPrec Datetime #

readListPrec :: ReadPrec [Datetime] #

Read DatetimeFormat 
Instance details

Defined in Chronos

Methods

readsPrec :: Int -> ReadS DatetimeFormat #

readList :: ReadS [DatetimeFormat] #

readPrec :: ReadPrec DatetimeFormat #

readListPrec :: ReadPrec [DatetimeFormat] #

Read Day 
Instance details

Defined in Chronos

Methods

readsPrec :: Int -> ReadS Day #

readList :: ReadS [Day] #

readPrec :: ReadPrec Day #

readListPrec :: ReadPrec [Day] #

Read DayOfMonth 
Instance details

Defined in Chronos

Methods

readsPrec :: Int -> ReadS DayOfMonth #

readList :: ReadS [DayOfMonth] #

readPrec :: ReadPrec DayOfMonth #

readListPrec :: ReadPrec [DayOfMonth] #

Read DayOfWeek 
Instance details

Defined in Chronos

Methods

readsPrec :: Int -> ReadS DayOfWeek #

readList :: ReadS [DayOfWeek] #

readPrec :: ReadPrec DayOfWeek #

readListPrec :: ReadPrec [DayOfWeek] #

Read DayOfYear 
Instance details

Defined in Chronos

Methods

readsPrec :: Int -> ReadS DayOfYear #

readList :: ReadS [DayOfYear] #

readPrec :: ReadPrec DayOfYear #

readListPrec :: ReadPrec [DayOfYear] #

Read Month 
Instance details

Defined in Chronos

Methods

readsPrec :: Int -> ReadS Month #

readList :: ReadS [Month] #

readPrec :: ReadPrec Month #

readListPrec :: ReadPrec [Month] #

Read MonthDate 
Instance details

Defined in Chronos

Methods

readsPrec :: Int -> ReadS MonthDate #

readList :: ReadS [MonthDate] #

readPrec :: ReadPrec MonthDate #

readListPrec :: ReadPrec [MonthDate] #

Read Offset 
Instance details

Defined in Chronos

Methods

readsPrec :: Int -> ReadS Offset #

readList :: ReadS [Offset] #

readPrec :: ReadPrec Offset #

readListPrec :: ReadPrec [Offset] #

Read OffsetDatetime 
Instance details

Defined in Chronos

Methods

readsPrec :: Int -> ReadS OffsetDatetime #

readList :: ReadS [OffsetDatetime] #

readPrec :: ReadPrec OffsetDatetime #

readListPrec :: ReadPrec [OffsetDatetime] #

Read OffsetFormat 
Instance details

Defined in Chronos

Methods

readsPrec :: Int -> ReadS OffsetFormat #

readList :: ReadS [OffsetFormat] #

readPrec :: ReadPrec OffsetFormat #

readListPrec :: ReadPrec [OffsetFormat] #

Read OrdinalDate 
Instance details

Defined in Chronos

Methods

readsPrec :: Int -> ReadS OrdinalDate #

readList :: ReadS [OrdinalDate] #

readPrec :: ReadPrec OrdinalDate #

readListPrec :: ReadPrec [OrdinalDate] #

Read SubsecondPrecision 
Instance details

Defined in Chronos

Read Time 
Instance details

Defined in Chronos

Methods

readsPrec :: Int -> ReadS Time #

readList :: ReadS [Time] #

readPrec :: ReadPrec Time #

readListPrec :: ReadPrec [Time] #

Read TimeInterval 
Instance details

Defined in Chronos

Methods

readsPrec :: Int -> ReadS TimeInterval #

readList :: ReadS [TimeInterval] #

readPrec :: ReadPrec TimeInterval #

readListPrec :: ReadPrec [TimeInterval] #

Read TimeOfDay 
Instance details

Defined in Chronos

Methods

readsPrec :: Int -> ReadS TimeOfDay #

readList :: ReadS [TimeOfDay] #

readPrec :: ReadPrec TimeOfDay #

readListPrec :: ReadPrec [TimeOfDay] #

Read TimeParts 
Instance details

Defined in Chronos

Methods

readsPrec :: Int -> ReadS TimeParts #

readList :: ReadS [TimeParts] #

readPrec :: ReadPrec TimeParts #

readListPrec :: ReadPrec [TimeParts] #

Read Timespan 
Instance details

Defined in Chronos

Read Year 
Instance details

Defined in Chronos

Methods

readsPrec :: Int -> ReadS Year #

readList :: ReadS [Year] #

readPrec :: ReadPrec Year #

readListPrec :: ReadPrec [Year] #

Read Value 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

readsPrec :: Int -> ReadS Value #

readList :: ReadS [Value] #

readPrec :: ReadPrec Value #

readListPrec :: ReadPrec [Value] #

Read Clock 
Instance details

Defined in System.Clock

Methods

readsPrec :: Int -> ReadS Clock #

readList :: ReadS [Clock] #

readPrec :: ReadPrec Clock #

readListPrec :: ReadPrec [Clock] #

Read DotNetTime 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

readsPrec :: Int -> ReadS DotNetTime #

readList :: ReadS [DotNetTime] #

readPrec :: ReadPrec DotNetTime #

readListPrec :: ReadPrec [DotNetTime] #

Read CascadeAction 
Instance details

Defined in Database.Persist.Types.Base

Methods

readsPrec :: Int -> ReadS CascadeAction #

readList :: ReadS [CascadeAction] #

readPrec :: ReadPrec CascadeAction #

readListPrec :: ReadPrec [CascadeAction] #

Read Checkmark 
Instance details

Defined in Database.Persist.Types.Base

Methods

readsPrec :: Int -> ReadS Checkmark #

readList :: ReadS [Checkmark] #

readPrec :: ReadPrec Checkmark #

readListPrec :: ReadPrec [Checkmark] #

Read CompositeDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

readsPrec :: Int -> ReadS CompositeDef #

readList :: ReadS [CompositeDef] #

readPrec :: ReadPrec CompositeDef #

readListPrec :: ReadPrec [CompositeDef] #

Read DBName 
Instance details

Defined in Database.Persist.Types.Base

Methods

readsPrec :: Int -> ReadS DBName #

readList :: ReadS [DBName] #

readPrec :: ReadPrec DBName #

readListPrec :: ReadPrec [DBName] #

Read EmbedEntityDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

readsPrec :: Int -> ReadS EmbedEntityDef #

readList :: ReadS [EmbedEntityDef] #

readPrec :: ReadPrec EmbedEntityDef #

readListPrec :: ReadPrec [EmbedEntityDef] #

Read EmbedFieldDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

readsPrec :: Int -> ReadS EmbedFieldDef #

readList :: ReadS [EmbedFieldDef] #

readPrec :: ReadPrec EmbedFieldDef #

readListPrec :: ReadPrec [EmbedFieldDef] #

Read EntityDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

readsPrec :: Int -> ReadS EntityDef #

readList :: ReadS [EntityDef] #

readPrec :: ReadPrec EntityDef #

readListPrec :: ReadPrec [EntityDef] #

Read FieldAttr 
Instance details

Defined in Database.Persist.Types.Base

Methods

readsPrec :: Int -> ReadS FieldAttr #

readList :: ReadS [FieldAttr] #

readPrec :: ReadPrec FieldAttr #

readListPrec :: ReadPrec [FieldAttr] #

Read FieldCascade 
Instance details

Defined in Database.Persist.Types.Base

Methods

readsPrec :: Int -> ReadS FieldCascade #

readList :: ReadS [FieldCascade] #

readPrec :: ReadPrec FieldCascade #

readListPrec :: ReadPrec [FieldCascade] #

Read FieldDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

readsPrec :: Int -> ReadS FieldDef #

readList :: ReadS [FieldDef] #

readPrec :: ReadPrec FieldDef #

readListPrec :: ReadPrec [FieldDef] #

Read FieldType 
Instance details

Defined in Database.Persist.Types.Base

Methods

readsPrec :: Int -> ReadS FieldType #

readList :: ReadS [FieldType] #

readPrec :: ReadPrec FieldType #

readListPrec :: ReadPrec [FieldType] #

Read ForeignDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

readsPrec :: Int -> ReadS ForeignDef #

readList :: ReadS [ForeignDef] #

readPrec :: ReadPrec ForeignDef #

readListPrec :: ReadPrec [ForeignDef] #

Read HaskellName 
Instance details

Defined in Database.Persist.Types.Base

Methods

readsPrec :: Int -> ReadS HaskellName #

readList :: ReadS [HaskellName] #

readPrec :: ReadPrec HaskellName #

readListPrec :: ReadPrec [HaskellName] #

Read PersistFilter 
Instance details

Defined in Database.Persist.Types.Base

Methods

readsPrec :: Int -> ReadS PersistFilter #

readList :: ReadS [PersistFilter] #

readPrec :: ReadPrec PersistFilter #

readListPrec :: ReadPrec [PersistFilter] #

Read PersistUpdate 
Instance details

Defined in Database.Persist.Types.Base

Methods

readsPrec :: Int -> ReadS PersistUpdate #

readList :: ReadS [PersistUpdate] #

readPrec :: ReadPrec PersistUpdate #

readListPrec :: ReadPrec [PersistUpdate] #

Read PersistValue 
Instance details

Defined in Database.Persist.Types.Base

Methods

readsPrec :: Int -> ReadS PersistValue #

readList :: ReadS [PersistValue] #

readPrec :: ReadPrec PersistValue #

readListPrec :: ReadPrec [PersistValue] #

Read ReferenceDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

readsPrec :: Int -> ReadS ReferenceDef #

readList :: ReadS [ReferenceDef] #

readPrec :: ReadPrec ReferenceDef #

readListPrec :: ReadPrec [ReferenceDef] #

Read SqlType 
Instance details

Defined in Database.Persist.Types.Base

Methods

readsPrec :: Int -> ReadS SqlType #

readList :: ReadS [SqlType] #

readPrec :: ReadPrec SqlType #

readListPrec :: ReadPrec [SqlType] #

Read UniqueDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

readsPrec :: Int -> ReadS UniqueDef #

readList :: ReadS [UniqueDef] #

readPrec :: ReadPrec UniqueDef #

readListPrec :: ReadPrec [UniqueDef] #

Read Environment 
Instance details

Defined in Katip.Core

Methods

readsPrec :: Int -> ReadS Environment #

readList :: ReadS [Environment] #

readPrec :: ReadPrec Environment #

readListPrec :: ReadPrec [Environment] #

Read Namespace 
Instance details

Defined in Katip.Core

Read Severity 
Instance details

Defined in Katip.Core

Read Verbosity 
Instance details

Defined in Katip.Core

Read Undefined 
Instance details

Defined in Universum.Debug

Read Scientific 
Instance details

Defined in Data.Scientific

Methods

readsPrec :: Int -> ReadS Scientific #

readList :: ReadS [Scientific] #

readPrec :: ReadPrec Scientific #

readListPrec :: ReadPrec [Scientific] #

Read TimeSpec 
Instance details

Defined in System.Clock

Methods

readsPrec :: Int -> ReadS TimeSpec #

readList :: ReadS [TimeSpec] #

readPrec :: ReadPrec TimeSpec #

readListPrec :: ReadPrec [TimeSpec] #

Read DatatypeVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

readsPrec :: Int -> ReadS DatatypeVariant #

readList :: ReadS [DatatypeVariant] #

readPrec :: ReadPrec DatatypeVariant #

readListPrec :: ReadPrec [DatatypeVariant] #

Read LogLevel 
Instance details

Defined in Control.Monad.Logger

Methods

readsPrec :: Int -> ReadS LogLevel #

readList :: ReadS [LogLevel] #

readPrec :: ReadPrec LogLevel #

readListPrec :: ReadPrec [LogLevel] #

Read UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

readsPrec :: Int -> ReadS UUID #

readList :: ReadS [UUID] #

readPrec :: ReadPrec UUID #

readListPrec :: ReadPrec [UUID] #

Read UnpackedUUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

readsPrec :: Int -> ReadS UnpackedUUID #

readList :: ReadS [UnpackedUUID] #

readPrec :: ReadPrec UnpackedUUID #

readListPrec :: ReadPrec [UnpackedUUID] #

Read Leniency 
Instance details

Defined in Data.String.Conv

Methods

readsPrec :: Int -> ReadS Leniency #

readList :: ReadS [Leniency] #

readPrec :: ReadPrec Leniency #

readListPrec :: ReadPrec [Leniency] #

Read StreamingType 
Instance details

Defined in Data.ProtoLens.Service.Types

Methods

readsPrec :: Int -> ReadS StreamingType #

readList :: ReadS [StreamingType] #

readPrec :: ReadPrec StreamingType #

readListPrec :: ReadPrec [StreamingType] #

Read NodeLocation Source # 
Instance details

Defined in LndClient.Data.Newtype

Read NodePubKey Source # 
Instance details

Defined in LndClient.Data.Newtype

Read PortNumber 
Instance details

Defined in Network.Socket.Types

Methods

readsPrec :: Int -> ReadS PortNumber #

readList :: ReadS [PortNumber] #

readPrec :: ReadPrec PortNumber #

readListPrec :: ReadPrec [PortNumber] #

Read FrameHeader 
Instance details

Defined in Network.HTTP2.Types

Methods

readsPrec :: Int -> ReadS FrameHeader #

readList :: ReadS [FrameHeader] #

readPrec :: ReadPrec FrameHeader #

readListPrec :: ReadPrec [FrameHeader] #

Read FramePayload 
Instance details

Defined in Network.HTTP2.Types

Methods

readsPrec :: Int -> ReadS FramePayload #

readList :: ReadS [FramePayload] #

readPrec :: ReadPrec FramePayload #

readListPrec :: ReadPrec [FramePayload] #

Read HTTP2Error 
Instance details

Defined in Network.HTTP2.Types

Methods

readsPrec :: Int -> ReadS HTTP2Error #

readList :: ReadS [HTTP2Error] #

readPrec :: ReadPrec HTTP2Error #

readListPrec :: ReadPrec [HTTP2Error] #

Read ErrorCodeId 
Instance details

Defined in Network.HTTP2.Types

Methods

readsPrec :: Int -> ReadS ErrorCodeId #

readList :: ReadS [ErrorCodeId] #

readPrec :: ReadPrec ErrorCodeId #

readListPrec :: ReadPrec [ErrorCodeId] #

Read Priority 
Instance details

Defined in Network.HTTP2.Types

Methods

readsPrec :: Int -> ReadS Priority #

readList :: ReadS [Priority] #

readPrec :: ReadPrec Priority #

readListPrec :: ReadPrec [Priority] #

Read AddrInfoFlag 
Instance details

Defined in Network.Socket

Methods

readsPrec :: Int -> ReadS AddrInfoFlag #

readList :: ReadS [AddrInfoFlag] #

readPrec :: ReadPrec AddrInfoFlag #

readListPrec :: ReadPrec [AddrInfoFlag] #

Read NameInfoFlag 
Instance details

Defined in Network.Socket

Methods

readsPrec :: Int -> ReadS NameInfoFlag #

readList :: ReadS [NameInfoFlag] #

readPrec :: ReadPrec NameInfoFlag #

readListPrec :: ReadPrec [NameInfoFlag] #

Read Family 
Instance details

Defined in Network.Socket.Types

Methods

readsPrec :: Int -> ReadS Family #

readList :: ReadS [Family] #

readPrec :: ReadPrec Family #

readListPrec :: ReadPrec [Family] #

Read SocketType 
Instance details

Defined in Network.Socket.Types

Methods

readsPrec :: Int -> ReadS SocketType #

readList :: ReadS [SocketType] #

readPrec :: ReadPrec SocketType #

readListPrec :: ReadPrec [SocketType] #

Read Frame 
Instance details

Defined in Network.HTTP2.Types

Methods

readsPrec :: Int -> ReadS Frame #

readList :: ReadS [Frame] #

readPrec :: ReadPrec Frame #

readListPrec :: ReadPrec [Frame] #

Read SettingsKeyId 
Instance details

Defined in Network.HTTP2.Types

Methods

readsPrec :: Int -> ReadS SettingsKeyId #

readList :: ReadS [SettingsKeyId] #

readPrec :: ReadPrec SettingsKeyId #

readListPrec :: ReadPrec [SettingsKeyId] #

Read LightningAddress Source # 
Instance details

Defined in LndClient.Data.Peer

Read Block 
Instance details

Defined in Network.Bitcoin.BlockChain

Methods

readsPrec :: Int -> ReadS Block #

readList :: ReadS [Block] #

readPrec :: ReadPrec Block #

readListPrec :: ReadPrec [Block] #

Read OutputInfo 
Instance details

Defined in Network.Bitcoin.BlockChain

Methods

readsPrec :: Int -> ReadS OutputInfo #

readList :: ReadS [OutputInfo] #

readPrec :: ReadPrec OutputInfo #

readListPrec :: ReadPrec [OutputInfo] #

Read OutputSetInfo 
Instance details

Defined in Network.Bitcoin.BlockChain

Methods

readsPrec :: Int -> ReadS OutputSetInfo #

readList :: ReadS [OutputSetInfo] #

readPrec :: ReadPrec OutputSetInfo #

readListPrec :: ReadPrec [OutputSetInfo] #

Read BlockTemplate 
Instance details

Defined in Network.Bitcoin.Mining

Methods

readsPrec :: Int -> ReadS BlockTemplate #

readList :: ReadS [BlockTemplate] #

readPrec :: ReadPrec BlockTemplate #

readListPrec :: ReadPrec [BlockTemplate] #

Read CoinBaseAux 
Instance details

Defined in Network.Bitcoin.Mining

Methods

readsPrec :: Int -> ReadS CoinBaseAux #

readList :: ReadS [CoinBaseAux] #

readPrec :: ReadPrec CoinBaseAux #

readListPrec :: ReadPrec [CoinBaseAux] #

Read HashData 
Instance details

Defined in Network.Bitcoin.Mining

Methods

readsPrec :: Int -> ReadS HashData #

readList :: ReadS [HashData] #

readPrec :: ReadPrec HashData #

readListPrec :: ReadPrec [HashData] #

Read MiningInfo 
Instance details

Defined in Network.Bitcoin.Mining

Methods

readsPrec :: Int -> ReadS MiningInfo #

readList :: ReadS [MiningInfo] #

readPrec :: ReadPrec MiningInfo #

readListPrec :: ReadPrec [MiningInfo] #

Read Transaction 
Instance details

Defined in Network.Bitcoin.Mining

Methods

readsPrec :: Int -> ReadS Transaction #

readList :: ReadS [Transaction] #

readPrec :: ReadPrec Transaction #

readListPrec :: ReadPrec [Transaction] #

Read BitcoinException 
Instance details

Defined in Network.Bitcoin.Types

Methods

readsPrec :: Int -> ReadS BitcoinException #

readList :: ReadS [BitcoinException] #

readPrec :: ReadPrec BitcoinException #

readListPrec :: ReadPrec [BitcoinException] #

Read CookieJar 
Instance details

Defined in Network.HTTP.Client.Types

Methods

readsPrec :: Int -> ReadS CookieJar #

readList :: ReadS [CookieJar] #

readPrec :: ReadPrec CookieJar #

readListPrec :: ReadPrec [CookieJar] #

Read Proxy 
Instance details

Defined in Network.HTTP.Client.Types

Methods

readsPrec :: Int -> ReadS Proxy #

readList :: ReadS [Proxy] #

readPrec :: ReadPrec Proxy #

readListPrec :: ReadPrec [Proxy] #

Read Cookie 
Instance details

Defined in Network.HTTP.Client.Types

Methods

readsPrec :: Int -> ReadS Cookie #

readList :: ReadS [Cookie] #

readPrec :: ReadPrec Cookie #

readListPrec :: ReadPrec [Cookie] #

Read BitcoinRpcError 
Instance details

Defined in Network.Bitcoin.Internal

Methods

readsPrec :: Int -> ReadS BitcoinRpcError #

readList :: ReadS [BitcoinRpcError] #

readPrec :: ReadPrec BitcoinRpcError #

readListPrec :: ReadPrec [BitcoinRpcError] #

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 (Maybe a)

Since: base-2.1

Instance details

Defined in GHC.Read

(Integral a, Read a) => Read (Ratio a)

Since: base-2.1

Instance details

Defined in GHC.Read

Read p => Read (Par1 p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Read a => Read (Complex a)

Since: base-2.1

Instance details

Defined in Data.Complex

Read a => Read (Min 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 (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 m => Read (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Read a => Read (Option a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Read a => Read (ZipList a)

Since: base-4.7.0.0

Instance details

Defined in Control.Applicative

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 (Dual 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 a => Read (Product a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Read a => Read (Down a)

Since: base-4.7.0.0

Instance details

Defined in Data.Ord

Read a => Read (NonEmpty a)

Since: base-4.11.0.0

Instance details

Defined in GHC.Read

Read e => Read (IntMap e) 
Instance details

Defined in Data.IntMap.Internal

Read a => Read (Tree a) 
Instance details

Defined in Data.Tree

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 (MeridiemLocale a) 
Instance details

Defined in Chronos

Methods

readsPrec :: Int -> ReadS (MeridiemLocale a) #

readList :: ReadS [MeridiemLocale a] #

readPrec :: ReadPrec (MeridiemLocale a) #

readListPrec :: ReadPrec [MeridiemLocale a] #

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

Methods

readsPrec :: Int -> ReadS (Vector a) #

readList :: ReadS [Vector a] #

readPrec :: ReadPrec (Vector a) #

readListPrec :: ReadPrec [Vector a] #

(Read (Key record), Read record) => Read (Entity record) 
Instance details

Defined in Database.Persist.Class.PersistEntity

Methods

readsPrec :: Int -> ReadS (Entity record) #

readList :: ReadS [Entity record] #

readPrec :: ReadPrec (Entity record) #

readListPrec :: ReadPrec [Entity record] #

(Eq a, Hashable a, Read a) => Read (HashSet a) 
Instance details

Defined in Data.HashSet.Base

Read a => Read (DList a) 
Instance details

Defined in Data.DList

Methods

readsPrec :: Int -> ReadS (DList a) #

readList :: ReadS [DList a] #

readPrec :: ReadPrec (DList a) #

readListPrec :: ReadPrec [DList a] #

(Read a, Storable a) => Read (Vector a) 
Instance details

Defined in Data.Vector.Storable

Methods

readsPrec :: Int -> ReadS (Vector a) #

readList :: ReadS [Vector a] #

readPrec :: ReadPrec (Vector a) #

readListPrec :: ReadPrec [Vector a] #

Read a => Read (Array a) 
Instance details

Defined in Data.Primitive.Array

Methods

readsPrec :: Int -> ReadS (Array a) #

readList :: ReadS [Array a] #

readPrec :: ReadPrec (Array a) #

readListPrec :: ReadPrec [Array a] #

Read a => Read (SmallArray a) 
Instance details

Defined in Data.Primitive.SmallArray

Methods

readsPrec :: Int -> ReadS (SmallArray a) #

readList :: ReadS [SmallArray a] #

readPrec :: ReadPrec (SmallArray a) #

readListPrec :: ReadPrec [SmallArray a] #

Read a => Read (Result a) 
Instance details

Defined in Codec.QRCode.Data.Result

Methods

readsPrec :: Int -> ReadS (Result a) #

readList :: ReadS [Result a] #

readPrec :: ReadPrec (Result a) #

readListPrec :: ReadPrec [Result a] #

(Read s, FoldCase s) => Read (CI s) 
Instance details

Defined in Data.CaseInsensitive.Internal

Methods

readsPrec :: Int -> ReadS (CI s) #

readList :: ReadS [CI s] #

readPrec :: ReadPrec (CI s) #

readListPrec :: ReadPrec [CI s] #

Read (Vout a) Source # 
Instance details

Defined in LndClient.Data.Newtype

HashAlgorithm a => Read (Digest a) 
Instance details

Defined in Crypto.Hash.Types

Methods

readsPrec :: Int -> ReadS (Digest a) #

readList :: ReadS [Digest a] #

readPrec :: ReadPrec (Digest a) #

readListPrec :: ReadPrec [Digest a] #

Read a => Read (BitcoinRpcResponse a) 
Instance details

Defined in Network.Bitcoin.Internal

Methods

readsPrec :: Int -> ReadS (BitcoinRpcResponse a) #

readList :: ReadS [BitcoinRpcResponse a] #

readPrec :: ReadPrec (BitcoinRpcResponse a) #

readListPrec :: ReadPrec [BitcoinRpcResponse a] #

(Read a, Read b) => Read (Either a b)

Since: base-3.0

Instance details

Defined in Data.Either

Read (V1 p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Read (U1 p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

(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)] #

(Ix a, Read a, Read b) => Read (Array a b)

Since: base-2.1

Instance details

Defined in GHC.Read

(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] #

Read (Proxy t)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

(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 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.Base

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 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)] #

Read a => Read (Const a b)

This instance would be equivalent to the derived instances of the Const newtype if the runConst 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] #

(Read1 f, Read a) => Read (IdentityT f a) 
Instance details

Defined in Control.Monad.Trans.Identity

(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] #

(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

Read b => Read (Tagged s b) 
Instance details

Defined in Data.Tagged

Methods

readsPrec :: Int -> ReadS (Tagged s b) #

readList :: ReadS [Tagged s b] #

readPrec :: ReadPrec (Tagged s b) #

readListPrec :: ReadPrec [Tagged s b] #

Read 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 (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 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 (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 (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 (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 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)] #

(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 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 (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 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 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 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 (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 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 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 (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 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
Real Int

Since: base-2.0.1

Instance details

Defined in GHC.Real

Methods

toRational :: Int -> Rational #

Real Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

toRational :: Int8 -> Rational #

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 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 Word

Since: base-2.1

Instance details

Defined in GHC.Real

Methods

toRational :: Word -> Rational #

Real Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Methods

toRational :: Word8 -> 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 CDev 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CDev -> Rational #

Real CIno 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CIno -> Rational #

Real CMode 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CMode -> Rational #

Real COff 
Instance details

Defined in System.Posix.Types

Methods

toRational :: COff -> Rational #

Real CPid 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CPid -> Rational #

Real CSsize 
Instance details

Defined in System.Posix.Types

Real CGid 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CGid -> Rational #

Real CNlink 
Instance details

Defined in System.Posix.Types

Real CUid 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CUid -> Rational #

Real CCc 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CCc -> Rational #

Real CSpeed 
Instance details

Defined in System.Posix.Types

Real CTcflag 
Instance details

Defined in System.Posix.Types

Real CRLim 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CRLim -> Rational #

Real CBlkSize 
Instance details

Defined in System.Posix.Types

Real CBlkCnt 
Instance details

Defined in System.Posix.Types

Real CClockId 
Instance details

Defined in System.Posix.Types

Real CFsBlkCnt 
Instance details

Defined in System.Posix.Types

Real CFsFilCnt 
Instance details

Defined in System.Posix.Types

Real CId 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CId -> Rational #

Real CKey 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CKey -> Rational #

Real Fd 
Instance details

Defined in System.Posix.Types

Methods

toRational :: Fd -> Rational #

Real Scientific 
Instance details

Defined in Data.Scientific

Methods

toRational :: Scientific -> Rational #

Real PortNumber 
Instance details

Defined in Network.Socket.Types

Methods

toRational :: PortNumber -> 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 (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

toRational :: Identity 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 (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
RealFrac Scientific 
Instance details

Defined in Data.Scientific

Methods

properFraction :: Integral b => Scientific -> (b, Scientific) #

truncate :: Integral b => Scientific -> b #

round :: Integral b => Scientific -> b #

ceiling :: Integral b => Scientific -> b #

floor :: Integral b => Scientific -> b #

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 (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 (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 #

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

Instances
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 Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

showsPrec :: Int -> Int8 -> ShowS #

show :: Int8 -> String #

showList :: [Int8] -> ShowS #

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 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 Ordering

Since: base-2.1

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 Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Methods

showsPrec :: Int -> Word8 -> ShowS #

show :: Word8 -> String #

showList :: [Word8] -> ShowS #

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 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 CallStack

Since: base-4.9.0.0

Instance details

Defined in GHC.Show

Show SomeTypeRep

Since: base-4.10.0.0

Instance details

Defined in Data.Typeable.Internal

Show Exp 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Exp -> ShowS #

show :: Exp -> String #

showList :: [Exp] -> ShowS #

Show Match 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Match -> ShowS #

show :: Match -> String #

showList :: [Match] -> ShowS #

Show Clause 
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 Type 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Type -> ShowS #

show :: Type -> String #

showList :: [Type] -> ShowS #

Show Dec 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Dec -> ShowS #

show :: Dec -> String #

showList :: [Dec] -> ShowS #

Show Name 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Name -> ShowS #

show :: Name -> String #

showList :: [Name] -> ShowS #

Show FunDep 
Instance details

Defined in Language.Haskell.TH.Syntax

Show InjectivityAnn 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Overlap 
Instance details

Defined in Language.Haskell.TH.Syntax

Show ()

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> () -> ShowS #

show :: () -> String #

showList :: [()] -> ShowS #

Show TyCon

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> TyCon -> ShowS #

show :: TyCon -> String #

showList :: [TyCon] -> ShowS #

Show Module

Since: base-4.9.0.0

Instance details

Defined in GHC.Show

Show TrName

Since: base-4.9.0.0

Instance details

Defined in GHC.Show

Show KindRep 
Instance details

Defined in GHC.Show

Show TypeLitSort

Since: base-4.11.0.0

Instance details

Defined in GHC.Show

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

Methods

showsPrec :: Int -> HandleType -> ShowS #

show :: HandleType -> String #

showList :: [HandleType] -> ShowS #

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 Version

Since: base-2.1

Instance details

Defined in Data.Version

Show PatternMatchFail

Since: base-4.0

Instance details

Defined in Control.Exception.Base

Show RecSelError

Since: base-4.0

Instance details

Defined in Control.Exception.Base

Show RecConError

Since: base-4.0

Instance details

Defined in Control.Exception.Base

Show RecUpdError

Since: base-4.0

Instance details

Defined in Control.Exception.Base

Show NoMethodError

Since: base-4.0

Instance details

Defined in Control.Exception.Base

Show TypeError

Since: base-4.9.0.0

Instance details

Defined in Control.Exception.Base

Show NonTermination

Since: base-4.0

Instance details

Defined in Control.Exception.Base

Show NestedAtomically

Since: base-4.0

Instance details

Defined in Control.Exception.Base

Show ThreadId

Since: base-4.2.0.0

Instance details

Defined in GHC.Conc.Sync

Show BlockReason

Since: base-4.3.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 CDev 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CDev -> ShowS #

show :: CDev -> String #

showList :: [CDev] -> ShowS #

Show CIno 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CIno -> ShowS #

show :: CIno -> String #

showList :: [CIno] -> ShowS #

Show CMode 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CMode -> ShowS #

show :: CMode -> String #

showList :: [CMode] -> ShowS #

Show COff 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> COff -> ShowS #

show :: COff -> String #

showList :: [COff] -> ShowS #

Show CPid 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CPid -> ShowS #

show :: CPid -> String #

showList :: [CPid] -> ShowS #

Show CSsize 
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 CNlink 
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 CCc 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CCc -> ShowS #

show :: CCc -> String #

showList :: [CCc] -> ShowS #

Show CSpeed 
Instance details

Defined in System.Posix.Types

Show CTcflag 
Instance details

Defined in System.Posix.Types

Show CRLim 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CRLim -> ShowS #

show :: CRLim -> String #

showList :: [CRLim] -> ShowS #

Show CBlkSize 
Instance details

Defined in System.Posix.Types

Show CBlkCnt 
Instance details

Defined in System.Posix.Types

Show CClockId 
Instance details

Defined in System.Posix.Types

Show CFsBlkCnt 
Instance details

Defined in System.Posix.Types

Show CFsFilCnt 
Instance details

Defined in System.Posix.Types

Show CId 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CId -> ShowS #

show :: CId -> String #

showList :: [CId] -> ShowS #

Show CKey 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CKey -> ShowS #

show :: CKey -> String #

showList :: [CKey] -> ShowS #

Show CTimer 
Instance details

Defined in System.Posix.Types

Show Fd 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> Fd -> ShowS #

show :: Fd -> String #

showList :: [Fd] -> ShowS #

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 Deadlock

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Show AllocationLimitExceeded

Since: base-4.7.1.0

Instance details

Defined in GHC.IO.Exception

Show CompactionFailed

Since: base-4.10.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 SomeAsyncException

Since: base-4.7.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 ArrayException

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Show FixIOException

Since: base-4.11.0.0

Instance details

Defined in GHC.IO.Exception

Show ExitCode 
Instance details

Defined in GHC.IO.Exception

Show IOErrorType

Since: base-4.1.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 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 MaskingState

Since: base-4.3.0.0

Instance details

Defined in GHC.IO

Show IOException

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Show ErrorCall

Since: base-4.0.0.0

Instance details

Defined in GHC.Exception

Show ArithException

Since: base-4.0.0.0

Instance details

Defined in GHC.Exception.Type

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 Fixity

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Show Associativity

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Show SourceUnpackedness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Show SourceStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Show DecidedStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

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 IOMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.IOMode

Show Lexeme

Since: base-2.1

Instance details

Defined in Text.Read.Lex

Show Number

Since: base-4.6.0.0

Instance details

Defined in Text.Read.Lex

Show SrcLoc

Since: base-4.9.0.0

Instance details

Defined in GHC.Show

Show SomeException

Since: base-3.0

Instance details

Defined in GHC.Exception.Type

Show ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Show ByteString 
Instance details

Defined in Data.ByteString.Internal

Show IntSet 
Instance details

Defined in Data.IntSet.Internal

Show Extension 
Instance details

Defined in GHC.LanguageExtensions.Type

Show ForeignSrcLang 
Instance details

Defined in GHC.ForeignSrcLang.Type

Show Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Methods

showsPrec :: Int -> Doc -> ShowS #

show :: Doc -> String #

showList :: [Doc] -> ShowS #

Show TextDetails 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Show Style 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

showsPrec :: Int -> Style -> ShowS #

show :: Style -> String #

showList :: [Style] -> ShowS #

Show Mode 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

showsPrec :: Int -> Mode -> ShowS #

show :: Mode -> String #

showList :: [Mode] -> ShowS #

Show ModName 
Instance details

Defined in Language.Haskell.TH.Syntax

Show PkgName 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Module 
Instance details

Defined in Language.Haskell.TH.Syntax

Show OccName 
Instance details

Defined in Language.Haskell.TH.Syntax

Show NameFlavour 
Instance details

Defined in Language.Haskell.TH.Syntax

Show NameSpace 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Loc 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Loc -> ShowS #

show :: Loc -> String #

showList :: [Loc] -> ShowS #

Show Info 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Info -> ShowS #

show :: Info -> String #

showList :: [Info] -> ShowS #

Show ModuleInfo 
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 Lit 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Lit -> ShowS #

show :: Lit -> String #

showList :: [Lit] -> ShowS #

Show Body 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Body -> ShowS #

show :: Body -> String #

showList :: [Body] -> ShowS #

Show Guard 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Guard -> ShowS #

show :: Guard -> String #

showList :: [Guard] -> ShowS #

Show Stmt 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Stmt -> ShowS #

show :: Stmt -> String #

showList :: [Stmt] -> ShowS #

Show Range 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Range -> ShowS #

show :: Range -> String #

showList :: [Range] -> ShowS #

Show DerivClause 
Instance details

Defined in Language.Haskell.TH.Syntax

Show DerivStrategy 
Instance details

Defined in Language.Haskell.TH.Syntax

Show TypeFamilyHead 
Instance details

Defined in Language.Haskell.TH.Syntax

Show TySynEqn 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Foreign 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Callconv 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Safety 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Pragma 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Inline 
Instance details

Defined in Language.Haskell.TH.Syntax

Show RuleMatch 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Phases 
Instance details

Defined in Language.Haskell.TH.Syntax

Show RuleBndr 
Instance details

Defined in Language.Haskell.TH.Syntax

Show AnnTarget 
Instance details

Defined in Language.Haskell.TH.Syntax

Show SourceUnpackedness 
Instance details

Defined in Language.Haskell.TH.Syntax

Show SourceStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Show DecidedStrictness 
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 Bang 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Bang -> ShowS #

show :: Bang -> String #

showList :: [Bang] -> ShowS #

Show PatSynDir 
Instance details

Defined in Language.Haskell.TH.Syntax

Show PatSynArgs 
Instance details

Defined in Language.Haskell.TH.Syntax

Show TyVarBndr 
Instance details

Defined in Language.Haskell.TH.Syntax

Show FamilyResultSig 
Instance details

Defined in Language.Haskell.TH.Syntax

Show TyLit 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> TyLit -> ShowS #

show :: TyLit -> String #

showList :: [TyLit] -> ShowS #

Show Role 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Role -> ShowS #

show :: Role -> String #

showList :: [Role] -> ShowS #

Show AnnLookup 
Instance details

Defined in Language.Haskell.TH.Syntax

Show FPFormat 
Instance details

Defined in Data.Text.Lazy.Builder.RealFloat

Show Builder 
Instance details

Defined in Data.Text.Internal.Builder

Show Decoding 
Instance details

Defined in Data.Text.Encoding

Show UnicodeException 
Instance details

Defined in Data.Text.Encoding.Error

Show ZonedTime 
Instance details

Defined in Data.Time.LocalTime.Internal.ZonedTime

Show LocalTime 
Instance details

Defined in Data.Time.LocalTime.Internal.LocalTime

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 Method 
Instance details

Defined in Codec.Compression.Zlib.Stream

Show CompressionLevel 
Instance details

Defined in Codec.Compression.Zlib.Stream

Show WindowBits 
Instance details

Defined in Codec.Compression.Zlib.Stream

Show MemoryLevel 
Instance details

Defined in Codec.Compression.Zlib.Stream

Show CompressionStrategy 
Instance details

Defined in Codec.Compression.Zlib.Stream

Show Date 
Instance details

Defined in Chronos

Methods

showsPrec :: Int -> Date -> ShowS #

show :: Date -> String #

showList :: [Date] -> ShowS #

Show Datetime 
Instance details

Defined in Chronos

Methods

showsPrec :: Int -> Datetime -> ShowS #

show :: Datetime -> String #

showList :: [Datetime] -> ShowS #

Show DatetimeFormat 
Instance details

Defined in Chronos

Methods

showsPrec :: Int -> DatetimeFormat -> ShowS #

show :: DatetimeFormat -> String #

showList :: [DatetimeFormat] -> ShowS #

Show Day 
Instance details

Defined in Chronos

Methods

showsPrec :: Int -> Day -> ShowS #

show :: Day -> String #

showList :: [Day] -> ShowS #

Show DayOfMonth 
Instance details

Defined in Chronos

Methods

showsPrec :: Int -> DayOfMonth -> ShowS #

show :: DayOfMonth -> String #

showList :: [DayOfMonth] -> ShowS #

Show DayOfWeek 
Instance details

Defined in Chronos

Methods

showsPrec :: Int -> DayOfWeek -> ShowS #

show :: DayOfWeek -> String #

showList :: [DayOfWeek] -> ShowS #

Show DayOfYear 
Instance details

Defined in Chronos

Methods

showsPrec :: Int -> DayOfYear -> ShowS #

show :: DayOfYear -> String #

showList :: [DayOfYear] -> ShowS #

Show Month 
Instance details

Defined in Chronos

Methods

showsPrec :: Int -> Month -> ShowS #

show :: Month -> String #

showList :: [Month] -> ShowS #

Show MonthDate 
Instance details

Defined in Chronos

Methods

showsPrec :: Int -> MonthDate -> ShowS #

show :: MonthDate -> String #

showList :: [MonthDate] -> ShowS #

Show Offset 
Instance details

Defined in Chronos

Methods

showsPrec :: Int -> Offset -> ShowS #

show :: Offset -> String #

showList :: [Offset] -> ShowS #

Show OffsetDatetime 
Instance details

Defined in Chronos

Methods

showsPrec :: Int -> OffsetDatetime -> ShowS #

show :: OffsetDatetime -> String #

showList :: [OffsetDatetime] -> ShowS #

Show OffsetFormat 
Instance details

Defined in Chronos

Methods

showsPrec :: Int -> OffsetFormat -> ShowS #

show :: OffsetFormat -> String #

showList :: [OffsetFormat] -> ShowS #

Show OrdinalDate 
Instance details

Defined in Chronos

Methods

showsPrec :: Int -> OrdinalDate -> ShowS #

show :: OrdinalDate -> String #

showList :: [OrdinalDate] -> ShowS #

Show SubsecondPrecision 
Instance details

Defined in Chronos

Show Time 
Instance details

Defined in Chronos

Methods

showsPrec :: Int -> Time -> ShowS #

show :: Time -> String #

showList :: [Time] -> ShowS #

Show TimeInterval 
Instance details

Defined in Chronos

Methods

showsPrec :: Int -> TimeInterval -> ShowS #

show :: TimeInterval -> String #

showList :: [TimeInterval] -> ShowS #

Show TimeOfDay 
Instance details

Defined in Chronos

Methods

showsPrec :: Int -> TimeOfDay -> ShowS #

show :: TimeOfDay -> String #

showList :: [TimeOfDay] -> ShowS #

Show TimeParts 
Instance details

Defined in Chronos

Methods

showsPrec :: Int -> TimeParts -> ShowS #

show :: TimeParts -> String #

showList :: [TimeParts] -> ShowS #

Show Timespan 
Instance details

Defined in Chronos

Show Year 
Instance details

Defined in Chronos

Methods

showsPrec :: Int -> Year -> ShowS #

show :: Year -> String #

showList :: [Year] -> ShowS #

Show Value 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

showsPrec :: Int -> Value -> ShowS #

show :: Value -> String #

showList :: [Value] -> ShowS #

Show JSONPathElement 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

showsPrec :: Int -> JSONPathElement -> ShowS #

show :: JSONPathElement -> String #

showList :: [JSONPathElement] -> ShowS #

Show Pos 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

showsPrec :: Int -> Pos -> ShowS #

show :: Pos -> String #

showList :: [Pos] -> ShowS #

Show More 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

showsPrec :: Int -> More -> ShowS #

show :: More -> String #

showList :: [More] -> ShowS #

Show ByteArray 
Instance details

Defined in Data.Primitive.ByteArray

Methods

showsPrec :: Int -> ByteArray -> ShowS #

show :: ByteArray -> String #

showList :: [ByteArray] -> ShowS #

Show Clock 
Instance details

Defined in System.Clock

Methods

showsPrec :: Int -> Clock -> ShowS #

show :: Clock -> String #

showList :: [Clock] -> ShowS #

Show AsyncCancelled 
Instance details

Defined in Control.Concurrent.Async

Methods

showsPrec :: Int -> AsyncCancelled -> ShowS #

show :: AsyncCancelled -> String #

showList :: [AsyncCancelled] -> ShowS #

Show ExceptionInLinkedThread 
Instance details

Defined in Control.Concurrent.Async

Methods

showsPrec :: Int -> ExceptionInLinkedThread -> ShowS #

show :: ExceptionInLinkedThread -> String #

showList :: [ExceptionInLinkedThread] -> ShowS #

Show DotNetTime 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

showsPrec :: Int -> DotNetTime -> ShowS #

show :: DotNetTime -> String #

showList :: [DotNetTime] -> ShowS #

Show Options 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

showsPrec :: Int -> Options -> ShowS #

show :: Options -> String #

showList :: [Options] -> ShowS #

Show SumEncoding 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

showsPrec :: Int -> SumEncoding -> ShowS #

show :: SumEncoding -> String #

showList :: [SumEncoding] -> ShowS #

Show Color 
Instance details

Defined in Data.List.Extra

Methods

showsPrec :: Int -> Color -> ShowS #

show :: Color -> String #

showList :: [Color] -> ShowS #

Show OverflowNatural 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

showsPrec :: Int -> OverflowNatural -> ShowS #

show :: OverflowNatural -> String #

showList :: [OverflowNatural] -> ShowS #

Show IsolationLevel 
Instance details

Defined in Database.Persist.Sql.Types.Internal

Methods

showsPrec :: Int -> IsolationLevel -> ShowS #

show :: IsolationLevel -> String #

showList :: [IsolationLevel] -> ShowS #

Show CascadeAction 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> CascadeAction -> ShowS #

show :: CascadeAction -> String #

showList :: [CascadeAction] -> ShowS #

Show Checkmark 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> Checkmark -> ShowS #

show :: Checkmark -> String #

showList :: [Checkmark] -> ShowS #

Show CompositeDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> CompositeDef -> ShowS #

show :: CompositeDef -> String #

showList :: [CompositeDef] -> ShowS #

Show DBName 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> DBName -> ShowS #

show :: DBName -> String #

showList :: [DBName] -> ShowS #

Show EmbedEntityDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> EmbedEntityDef -> ShowS #

show :: EmbedEntityDef -> String #

showList :: [EmbedEntityDef] -> ShowS #

Show EmbedFieldDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> EmbedFieldDef -> ShowS #

show :: EmbedFieldDef -> String #

showList :: [EmbedFieldDef] -> ShowS #

Show EntityDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> EntityDef -> ShowS #

show :: EntityDef -> String #

showList :: [EntityDef] -> ShowS #

Show FieldAttr 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> FieldAttr -> ShowS #

show :: FieldAttr -> String #

showList :: [FieldAttr] -> ShowS #

Show FieldCascade 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> FieldCascade -> ShowS #

show :: FieldCascade -> String #

showList :: [FieldCascade] -> ShowS #

Show FieldDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> FieldDef -> ShowS #

show :: FieldDef -> String #

showList :: [FieldDef] -> ShowS #

Show FieldType 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> FieldType -> ShowS #

show :: FieldType -> String #

showList :: [FieldType] -> ShowS #

Show ForeignDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> ForeignDef -> ShowS #

show :: ForeignDef -> String #

showList :: [ForeignDef] -> ShowS #

Show HaskellName 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> HaskellName -> ShowS #

show :: HaskellName -> String #

showList :: [HaskellName] -> ShowS #

Show IsNullable 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> IsNullable -> ShowS #

show :: IsNullable -> String #

showList :: [IsNullable] -> ShowS #

Show OnlyUniqueException 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> OnlyUniqueException -> ShowS #

show :: OnlyUniqueException -> String #

showList :: [OnlyUniqueException] -> ShowS #

Show PersistException 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> PersistException -> ShowS #

show :: PersistException -> String #

showList :: [PersistException] -> ShowS #

Show PersistFilter 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> PersistFilter -> ShowS #

show :: PersistFilter -> String #

showList :: [PersistFilter] -> ShowS #

Show PersistUpdate 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> PersistUpdate -> ShowS #

show :: PersistUpdate -> String #

showList :: [PersistUpdate] -> ShowS #

Show PersistValue 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> PersistValue -> ShowS #

show :: PersistValue -> String #

showList :: [PersistValue] -> ShowS #

Show ReferenceDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> ReferenceDef -> ShowS #

show :: ReferenceDef -> String #

showList :: [ReferenceDef] -> ShowS #

Show SqlType 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> SqlType -> ShowS #

show :: SqlType -> String #

showList :: [SqlType] -> ShowS #

Show UniqueDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> UniqueDef -> ShowS #

show :: UniqueDef -> String #

showList :: [UniqueDef] -> ShowS #

Show UpdateException 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> UpdateException -> ShowS #

show :: UpdateException -> String #

showList :: [UpdateException] -> ShowS #

Show WhyNullable 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> WhyNullable -> ShowS #

show :: WhyNullable -> String #

showList :: [WhyNullable] -> ShowS #

Show Environment 
Instance details

Defined in Katip.Core

Methods

showsPrec :: Int -> Environment -> ShowS #

show :: Environment -> String #

showList :: [Environment] -> ShowS #

Show LogStr 
Instance details

Defined in Katip.Core

Methods

showsPrec :: Int -> LogStr -> ShowS #

show :: LogStr -> String #

showList :: [LogStr] -> ShowS #

Show Namespace 
Instance details

Defined in Katip.Core

Show PayloadSelection 
Instance details

Defined in Katip.Core

Methods

showsPrec :: Int -> PayloadSelection -> ShowS #

show :: PayloadSelection -> String #

showList :: [PayloadSelection] -> ShowS #

Show ScribeSettings 
Instance details

Defined in Katip.Core

Methods

showsPrec :: Int -> ScribeSettings -> ShowS #

show :: ScribeSettings -> String #

showList :: [ScribeSettings] -> ShowS #

Show Severity 
Instance details

Defined in Katip.Core

Show ThreadIdText 
Instance details

Defined in Katip.Core

Methods

showsPrec :: Int -> ThreadIdText -> ShowS #

show :: ThreadIdText -> String #

showList :: [ThreadIdText] -> ShowS #

Show Verbosity 
Instance details

Defined in Katip.Core

Show ColorStrategy 
Instance details

Defined in Katip.Scribes.Handle

Show Undefined 
Instance details

Defined in Universum.Debug

Show Bug 
Instance details

Defined in Universum.Exception

Methods

showsPrec :: Int -> Bug -> ShowS #

show :: Bug -> String #

showList :: [Bug] -> ShowS #

Show ConcException 
Instance details

Defined in UnliftIO.Internals.Async

Methods

showsPrec :: Int -> ConcException -> ShowS #

show :: ConcException -> String #

showList :: [ConcException] -> ShowS #

Show UnixDiffTime 
Instance details

Defined in Data.UnixTime.Types

Methods

showsPrec :: Int -> UnixDiffTime -> ShowS #

show :: UnixDiffTime -> String #

showList :: [UnixDiffTime] -> ShowS #

Show UnixTime 
Instance details

Defined in Data.UnixTime.Types

Methods

showsPrec :: Int -> UnixTime -> ShowS #

show :: UnixTime -> String #

showList :: [UnixTime] -> ShowS #

Show Scientific 
Instance details

Defined in Data.Scientific

Methods

showsPrec :: Int -> Scientific -> ShowS #

show :: Scientific -> String #

showList :: [Scientific] -> ShowS #

Show DateFormatSpec 
Instance details

Defined in Data.Time.Format.Parse

Methods

showsPrec :: Int -> DateFormatSpec -> ShowS #

show :: DateFormatSpec -> String #

showList :: [DateFormatSpec] -> ShowS #

Show Padding 
Instance details

Defined in Data.Time.Format.Parse

Methods

showsPrec :: Int -> Padding -> ShowS #

show :: Padding -> String #

showList :: [Padding] -> ShowS #

Show LocShow 
Instance details

Defined in Katip.Core

Methods

showsPrec :: Int -> LocShow -> ShowS #

show :: LocShow -> String #

showList :: [LocShow] -> ShowS #

Show TimeSpec 
Instance details

Defined in System.Clock

Methods

showsPrec :: Int -> TimeSpec -> ShowS #

show :: TimeSpec -> String #

showList :: [TimeSpec] -> ShowS #

Show InvalidAccess 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

showsPrec :: Int -> InvalidAccess -> ShowS #

show :: InvalidAccess -> String #

showList :: [InvalidAccess] -> ShowS #

Show ResourceCleanupException 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

showsPrec :: Int -> ResourceCleanupException -> ShowS #

show :: ResourceCleanupException -> String #

showList :: [ResourceCleanupException] -> ShowS #

Show ConstructorInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

showsPrec :: Int -> ConstructorInfo -> ShowS #

show :: ConstructorInfo -> String #

showList :: [ConstructorInfo] -> ShowS #

Show ConstructorVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

showsPrec :: Int -> ConstructorVariant -> ShowS #

show :: ConstructorVariant -> String #

showList :: [ConstructorVariant] -> ShowS #

Show DatatypeInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

showsPrec :: Int -> DatatypeInfo -> ShowS #

show :: DatatypeInfo -> String #

showList :: [DatatypeInfo] -> ShowS #

Show DatatypeVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

showsPrec :: Int -> DatatypeVariant -> ShowS #

show :: DatatypeVariant -> String #

showList :: [DatatypeVariant] -> ShowS #

Show FieldStrictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

showsPrec :: Int -> FieldStrictness -> ShowS #

show :: FieldStrictness -> String #

showList :: [FieldStrictness] -> ShowS #

Show Strictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

showsPrec :: Int -> Strictness -> ShowS #

show :: Strictness -> String #

showList :: [Strictness] -> ShowS #

Show Unpackedness 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

showsPrec :: Int -> Unpackedness -> ShowS #

show :: Unpackedness -> String #

showList :: [Unpackedness] -> ShowS #

Show LogLevel 
Instance details

Defined in Control.Monad.Logger

Methods

showsPrec :: Int -> LogLevel -> ShowS #

show :: LogLevel -> String #

showList :: [LogLevel] -> ShowS #

Show UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

showsPrec :: Int -> UUID -> ShowS #

show :: UUID -> String #

showList :: [UUID] -> ShowS #

Show UnpackedUUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

showsPrec :: Int -> UnpackedUUID -> ShowS #

show :: UnpackedUUID -> String #

showList :: [UnpackedUUID] -> ShowS #

Show Addr 
Instance details

Defined in Data.Primitive.Types

Methods

showsPrec :: Int -> Addr -> ShowS #

show :: Addr -> String #

showList :: [Addr] -> ShowS #

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 Leniency 
Instance details

Defined in Data.String.Conv

Methods

showsPrec :: Int -> Leniency -> ShowS #

show :: Leniency -> String #

showList :: [Leniency] -> ShowS #

Show AsyncExceptionWrapper 
Instance details

Defined in Control.Exception.Safe

Methods

showsPrec :: Int -> AsyncExceptionWrapper -> ShowS #

show :: AsyncExceptionWrapper -> String #

showList :: [AsyncExceptionWrapper] -> ShowS #

Show StringException 
Instance details

Defined in Control.Exception.Safe

Methods

showsPrec :: Int -> StringException -> ShowS #

show :: StringException -> String #

showList :: [StringException] -> ShowS #

Show SyncExceptionWrapper 
Instance details

Defined in Control.Exception.Safe

Methods

showsPrec :: Int -> SyncExceptionWrapper -> ShowS #

show :: SyncExceptionWrapper -> String #

showList :: [SyncExceptionWrapper] -> ShowS #

Show ClientError 
Instance details

Defined in Network.HTTP2.Client.Exceptions

Methods

showsPrec :: Int -> ClientError -> ShowS #

show :: ClientError -> String #

showList :: [ClientError] -> ShowS #

Show LndError Source # 
Instance details

Defined in LndClient.Data.Type

Show TxKind Source # 
Instance details

Defined in LndClient.Data.Kind

Show Tag 
Instance details

Defined in Data.ProtoLens.Encoding.Wire

Methods

showsPrec :: Int -> Tag -> ShowS #

show :: Tag -> String #

showList :: [Tag] -> ShowS #

Show MessageOrGroup 
Instance details

Defined in Data.ProtoLens.Message

Methods

showsPrec :: Int -> MessageOrGroup -> ShowS #

show :: MessageOrGroup -> String #

showList :: [MessageOrGroup] -> ShowS #

Show PixelCMYK16 
Instance details

Defined in Codec.Picture.Types

Methods

showsPrec :: Int -> PixelCMYK16 -> ShowS #

show :: PixelCMYK16 -> String #

showList :: [PixelCMYK16] -> ShowS #

Show PixelCMYK8 
Instance details

Defined in Codec.Picture.Types

Methods

showsPrec :: Int -> PixelCMYK8 -> ShowS #

show :: PixelCMYK8 -> String #

showList :: [PixelCMYK8] -> ShowS #

Show PixelRGB16 
Instance details

Defined in Codec.Picture.Types

Methods

showsPrec :: Int -> PixelRGB16 -> ShowS #

show :: PixelRGB16 -> String #

showList :: [PixelRGB16] -> ShowS #

Show PixelRGB8 
Instance details

Defined in Codec.Picture.Types

Methods

showsPrec :: Int -> PixelRGB8 -> ShowS #

show :: PixelRGB8 -> String #

showList :: [PixelRGB8] -> ShowS #

Show PixelRGBA16 
Instance details

Defined in Codec.Picture.Types

Methods

showsPrec :: Int -> PixelRGBA16 -> ShowS #

show :: PixelRGBA16 -> String #

showList :: [PixelRGBA16] -> ShowS #

Show PixelRGBA8 
Instance details

Defined in Codec.Picture.Types

Methods

showsPrec :: Int -> PixelRGBA8 -> ShowS #

show :: PixelRGBA8 -> String #

showList :: [PixelRGBA8] -> ShowS #

Show PixelRGBF 
Instance details

Defined in Codec.Picture.Types

Methods

showsPrec :: Int -> PixelRGBF -> ShowS #

show :: PixelRGBF -> String #

showList :: [PixelRGBF] -> ShowS #

Show PixelYA16 
Instance details

Defined in Codec.Picture.Types

Methods

showsPrec :: Int -> PixelYA16 -> ShowS #

show :: PixelYA16 -> String #

showList :: [PixelYA16] -> ShowS #

Show PixelYA8 
Instance details

Defined in Codec.Picture.Types

Methods

showsPrec :: Int -> PixelYA8 -> ShowS #

show :: PixelYA8 -> String #

showList :: [PixelYA8] -> ShowS #

Show PixelYCbCr8 
Instance details

Defined in Codec.Picture.Types

Methods

showsPrec :: Int -> PixelYCbCr8 -> ShowS #

show :: PixelYCbCr8 -> String #

showList :: [PixelYCbCr8] -> ShowS #

Show PixelYCbCrK8 
Instance details

Defined in Codec.Picture.Types

Methods

showsPrec :: Int -> PixelYCbCrK8 -> ShowS #

show :: PixelYCbCrK8 -> String #

showList :: [PixelYCbCrK8] -> ShowS #

Show QRPngDataUrl Source # 
Instance details

Defined in LndClient.QRCode

Show StreamingType 
Instance details

Defined in Data.ProtoLens.Service.Types

Methods

showsPrec :: Int -> StreamingType -> ShowS #

show :: StreamingType -> String #

showList :: [StreamingType] -> ShowS #

Show WalletBalanceResponse'AccountBalanceEntry Source # 
Instance details

Defined in Proto.LndGrpc

Show WalletBalanceResponse Source # 
Instance details

Defined in Proto.LndGrpc

Show WalletBalanceRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show WalletAccountBalance Source # 
Instance details

Defined in Proto.LndGrpc

Show VerifyMessageResponse Source # 
Instance details

Defined in Proto.LndGrpc

Show VerifyMessageRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show VerifyChanBackupResponse Source # 
Instance details

Defined in Proto.LndGrpc

Show Utxo Source # 
Instance details

Defined in Proto.LndGrpc

Methods

showsPrec :: Int -> Utxo -> ShowS #

show :: Utxo -> String #

showList :: [Utxo] -> ShowS #

Show TransactionDetails Source # 
Instance details

Defined in Proto.LndGrpc

Show Transaction Source # 
Instance details

Defined in Proto.LndGrpc

Show TimestampedError Source # 
Instance details

Defined in Proto.LndGrpc

Show StopResponse Source # 
Instance details

Defined in Proto.LndGrpc

Show StopRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show SignMessageResponse Source # 
Instance details

Defined in Proto.LndGrpc

Show SignMessageRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show SendToRouteRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show SendResponse Source # 
Instance details

Defined in Proto.LndGrpc

Show SendRequest'DestCustomRecordsEntry Source # 
Instance details

Defined in Proto.LndGrpc

Show SendRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show SendManyResponse Source # 
Instance details

Defined in Proto.LndGrpc

Show SendManyRequest'AddrToAmountEntry Source # 
Instance details

Defined in Proto.LndGrpc

Show SendManyRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show SendCoinsResponse Source # 
Instance details

Defined in Proto.LndGrpc

Show SendCoinsRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show RoutingPolicy Source # 
Instance details

Defined in Proto.LndGrpc

Show RouteHint Source # 
Instance details

Defined in Proto.LndGrpc

Show Route Source # 
Instance details

Defined in Proto.LndGrpc

Methods

showsPrec :: Int -> Route -> ShowS #

show :: Route -> String #

showList :: [Route] -> ShowS #

Show RestoreChanBackupRequest'Backup Source # 
Instance details

Defined in Proto.LndGrpc

Show RestoreChanBackupRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show RestoreBackupResponse Source # 
Instance details

Defined in Proto.LndGrpc

Show ResolutionType Source # 
Instance details

Defined in Proto.LndGrpc

Show ResolutionType'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Show ResolutionOutcome Source # 
Instance details

Defined in Proto.LndGrpc

Show ResolutionOutcome'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Show Resolution Source # 
Instance details

Defined in Proto.LndGrpc

Show ReadyForPsbtFunding Source # 
Instance details

Defined in Proto.LndGrpc

Show QueryRoutesResponse Source # 
Instance details

Defined in Proto.LndGrpc

Show QueryRoutesRequest'DestCustomRecordsEntry Source # 
Instance details

Defined in Proto.LndGrpc

Show QueryRoutesRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show PsbtShim Source # 
Instance details

Defined in Proto.LndGrpc

Show PolicyUpdateResponse Source # 
Instance details

Defined in Proto.LndGrpc

Show PolicyUpdateRequest'Scope Source # 
Instance details

Defined in Proto.LndGrpc

Show PolicyUpdateRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show PendingUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Show PendingHTLC Source # 
Instance details

Defined in Proto.LndGrpc

Show PendingChannelsResponse'WaitingCloseChannel Source # 
Instance details

Defined in Proto.LndGrpc

Show PendingChannelsResponse'PendingOpenChannel Source # 
Instance details

Defined in Proto.LndGrpc

Show PendingChannelsResponse'PendingChannel Source # 
Instance details

Defined in Proto.LndGrpc

Show PendingChannelsResponse'ForceClosedChannel'AnchorState Source # 
Instance details

Defined in Proto.LndGrpc

Show PendingChannelsResponse'ForceClosedChannel'AnchorState'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Show PendingChannelsResponse'ForceClosedChannel Source # 
Instance details

Defined in Proto.LndGrpc

Show PendingChannelsResponse'Commitments Source # 
Instance details

Defined in Proto.LndGrpc

Show PendingChannelsResponse'ClosedChannel Source # 
Instance details

Defined in Proto.LndGrpc

Show PendingChannelsResponse Source # 
Instance details

Defined in Proto.LndGrpc

Show PendingChannelsRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show PeerEventSubscription Source # 
Instance details

Defined in Proto.LndGrpc

Show PeerEvent'EventType Source # 
Instance details

Defined in Proto.LndGrpc

Show PeerEvent'EventType'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Show PeerEvent Source # 
Instance details

Defined in Proto.LndGrpc

Show Peer'SyncType Source # 
Instance details

Defined in Proto.LndGrpc

Show Peer'SyncType'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Show Peer'FeaturesEntry Source # 
Instance details

Defined in Proto.LndGrpc

Show Peer Source # 
Instance details

Defined in Proto.LndGrpc

Methods

showsPrec :: Int -> Peer -> ShowS #

show :: Peer -> String #

showList :: [Peer] -> ShowS #

Show PaymentHash Source # 
Instance details

Defined in Proto.LndGrpc

Show PaymentFailureReason Source # 
Instance details

Defined in Proto.LndGrpc

Show PaymentFailureReason'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Show Payment'PaymentStatus Source # 
Instance details

Defined in Proto.LndGrpc

Show Payment'PaymentStatus'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Show Payment Source # 
Instance details

Defined in Proto.LndGrpc

Show PayReqString Source # 
Instance details

Defined in Proto.LndGrpc

Show PayReq'FeaturesEntry Source # 
Instance details

Defined in Proto.LndGrpc

Show PayReq Source # 
Instance details

Defined in Proto.LndGrpc

Show OutPoint Source # 
Instance details

Defined in Proto.LndGrpc

Show OpenStatusUpdate'Update Source # 
Instance details

Defined in Proto.LndGrpc

Show OpenStatusUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Show OpenChannelRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show Op Source # 
Instance details

Defined in Proto.LndGrpc

Methods

showsPrec :: Int -> Op -> ShowS #

show :: Op -> String #

showList :: [Op] -> ShowS #

Show NodeUpdate'FeaturesEntry Source # 
Instance details

Defined in Proto.LndGrpc

Show NodeUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Show NodePair Source # 
Instance details

Defined in Proto.LndGrpc

Show NodeMetricsResponse'BetweennessCentralityEntry Source # 
Instance details

Defined in Proto.LndGrpc

Show NodeMetricsResponse Source # 
Instance details

Defined in Proto.LndGrpc

Show NodeMetricsRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show NodeMetricType Source # 
Instance details

Defined in Proto.LndGrpc

Show NodeMetricType'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Show NodeInfoRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show NodeInfo Source # 
Instance details

Defined in Proto.LndGrpc

Show NodeAddress Source # 
Instance details

Defined in Proto.LndGrpc

Show NewAddressResponse Source # 
Instance details

Defined in Proto.LndGrpc

Show NewAddressRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show NetworkInfoRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show NetworkInfo Source # 
Instance details

Defined in Proto.LndGrpc

Show MultiChanBackup Source # 
Instance details

Defined in Proto.LndGrpc

Show MacaroonPermissionList Source # 
Instance details

Defined in Proto.LndGrpc

Show MacaroonPermission Source # 
Instance details

Defined in Proto.LndGrpc

Show MacaroonId Source # 
Instance details

Defined in Proto.LndGrpc

Show MPPRecord Source # 
Instance details

Defined in Proto.LndGrpc

Show ListUnspentResponse Source # 
Instance details

Defined in Proto.LndGrpc

Show ListUnspentRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show ListPermissionsResponse'MethodPermissionsEntry Source # 
Instance details

Defined in Proto.LndGrpc

Show ListPermissionsResponse Source # 
Instance details

Defined in Proto.LndGrpc

Show ListPermissionsRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show ListPeersResponse Source # 
Instance details

Defined in Proto.LndGrpc

Show ListPeersRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show ListPaymentsResponse Source # 
Instance details

Defined in Proto.LndGrpc

Show ListPaymentsRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show ListMacaroonIDsResponse Source # 
Instance details

Defined in Proto.LndGrpc

Show ListMacaroonIDsRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show ListInvoiceResponse Source # 
Instance details

Defined in Proto.LndGrpc

Show ListInvoiceRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show ListChannelsResponse Source # 
Instance details

Defined in Proto.LndGrpc

Show ListChannelsRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show LightningNode'FeaturesEntry Source # 
Instance details

Defined in Proto.LndGrpc

Show LightningNode Source # 
Instance details

Defined in Proto.LndGrpc

Show LightningAddress Source # 
Instance details

Defined in Proto.LndGrpc

Show KeyLocator Source # 
Instance details

Defined in Proto.LndGrpc

Show KeyDescriptor Source # 
Instance details

Defined in Proto.LndGrpc

Show InvoiceSubscription Source # 
Instance details

Defined in Proto.LndGrpc

Show InvoiceHTLCState Source # 
Instance details

Defined in Proto.LndGrpc

Show InvoiceHTLCState'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Show InvoiceHTLC'CustomRecordsEntry Source # 
Instance details

Defined in Proto.LndGrpc

Show InvoiceHTLC Source # 
Instance details

Defined in Proto.LndGrpc

Show Invoice'InvoiceState Source # 
Instance details

Defined in Proto.LndGrpc

Show Invoice'InvoiceState'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Show Invoice'FeaturesEntry Source # 
Instance details

Defined in Proto.LndGrpc

Show Invoice Source # 
Instance details

Defined in Proto.LndGrpc

Show Initiator Source # 
Instance details

Defined in Proto.LndGrpc

Show Initiator'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Show HopHint Source # 
Instance details

Defined in Proto.LndGrpc

Show Hop'CustomRecordsEntry Source # 
Instance details

Defined in Proto.LndGrpc

Show Hop Source # 
Instance details

Defined in Proto.LndGrpc

Methods

showsPrec :: Int -> Hop -> ShowS #

show :: Hop -> String #

showList :: [Hop] -> ShowS #

Show HTLCAttempt'HTLCStatus Source # 
Instance details

Defined in Proto.LndGrpc

Show HTLCAttempt'HTLCStatus'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Show HTLCAttempt Source # 
Instance details

Defined in Proto.LndGrpc

Show HTLC Source # 
Instance details

Defined in Proto.LndGrpc

Methods

showsPrec :: Int -> HTLC -> ShowS #

show :: HTLC -> String #

showList :: [HTLC] -> ShowS #

Show GraphTopologyUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Show GraphTopologySubscription Source # 
Instance details

Defined in Proto.LndGrpc

Show GetTransactionsRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show GetRecoveryInfoResponse Source # 
Instance details

Defined in Proto.LndGrpc

Show GetRecoveryInfoRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show GetInfoResponse'FeaturesEntry Source # 
Instance details

Defined in Proto.LndGrpc

Show GetInfoResponse Source # 
Instance details

Defined in Proto.LndGrpc

Show GetInfoRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show FundingTransitionMsg'Trigger Source # 
Instance details

Defined in Proto.LndGrpc

Show FundingTransitionMsg Source # 
Instance details

Defined in Proto.LndGrpc

Show FundingStateStepResp Source # 
Instance details

Defined in Proto.LndGrpc

Show FundingShimCancel Source # 
Instance details

Defined in Proto.LndGrpc

Show FundingShim'Shim Source # 
Instance details

Defined in Proto.LndGrpc

Show FundingShim Source # 
Instance details

Defined in Proto.LndGrpc

Show FundingPsbtVerify Source # 
Instance details

Defined in Proto.LndGrpc

Show FundingPsbtFinalize Source # 
Instance details

Defined in Proto.LndGrpc

Show ForwardingHistoryResponse Source # 
Instance details

Defined in Proto.LndGrpc

Show ForwardingHistoryRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show ForwardingEvent Source # 
Instance details

Defined in Proto.LndGrpc

Show FloatMetric Source # 
Instance details

Defined in Proto.LndGrpc

Show FeeReportResponse Source # 
Instance details

Defined in Proto.LndGrpc

Show FeeReportRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show FeeLimit'Limit Source # 
Instance details

Defined in Proto.LndGrpc

Show FeeLimit Source # 
Instance details

Defined in Proto.LndGrpc

Show FeatureBit Source # 
Instance details

Defined in Proto.LndGrpc

Show FeatureBit'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Show Feature Source # 
Instance details

Defined in Proto.LndGrpc

Show Failure'FailureCode Source # 
Instance details

Defined in Proto.LndGrpc

Show Failure'FailureCode'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Show Failure Source # 
Instance details

Defined in Proto.LndGrpc

Show ExportChannelBackupRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show EstimateFeeResponse Source # 
Instance details

Defined in Proto.LndGrpc

Show EstimateFeeRequest'AddrToAmountEntry Source # 
Instance details

Defined in Proto.LndGrpc

Show EstimateFeeRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show EdgeLocator Source # 
Instance details

Defined in Proto.LndGrpc

Show DisconnectPeerResponse Source # 
Instance details

Defined in Proto.LndGrpc

Show DisconnectPeerRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show DeleteMacaroonIDResponse Source # 
Instance details

Defined in Proto.LndGrpc

Show DeleteMacaroonIDRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show DeleteAllPaymentsResponse Source # 
Instance details

Defined in Proto.LndGrpc

Show DeleteAllPaymentsRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show DebugLevelResponse Source # 
Instance details

Defined in Proto.LndGrpc

Show DebugLevelRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show ConnectPeerResponse Source # 
Instance details

Defined in Proto.LndGrpc

Show ConnectPeerRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show ConfirmationUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Show CommitmentType Source # 
Instance details

Defined in Proto.LndGrpc

Show CommitmentType'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Show ClosedChannelsResponse Source # 
Instance details

Defined in Proto.LndGrpc

Show ClosedChannelsRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show ClosedChannelUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Show CloseStatusUpdate'Update Source # 
Instance details

Defined in Proto.LndGrpc

Show CloseStatusUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Show CloseChannelRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show ChannelUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Show ChannelPoint'FundingTxid Source # 
Instance details

Defined in Proto.LndGrpc

Show ChannelPoint Source # 
Instance details

Defined in Proto.LndGrpc

Show ChannelOpenUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Show ChannelGraphRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show ChannelGraph Source # 
Instance details

Defined in Proto.LndGrpc

Show ChannelFeeReport Source # 
Instance details

Defined in Proto.LndGrpc

Show ChannelEventUpdate'UpdateType Source # 
Instance details

Defined in Proto.LndGrpc

Show ChannelEventUpdate'UpdateType'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Show ChannelEventUpdate'Channel Source # 
Instance details

Defined in Proto.LndGrpc

Show ChannelEventUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Show ChannelEventSubscription Source # 
Instance details

Defined in Proto.LndGrpc

Show ChannelEdgeUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Show ChannelEdge Source # 
Instance details

Defined in Proto.LndGrpc

Show ChannelConstraints Source # 
Instance details

Defined in Proto.LndGrpc

Show ChannelCloseUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Show ChannelCloseSummary'ClosureType Source # 
Instance details

Defined in Proto.LndGrpc

Show ChannelCloseSummary'ClosureType'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Show ChannelCloseSummary Source # 
Instance details

Defined in Proto.LndGrpc

Show ChannelBalanceResponse Source # 
Instance details

Defined in Proto.LndGrpc

Show ChannelBalanceRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show ChannelBackups Source # 
Instance details

Defined in Proto.LndGrpc

Show ChannelBackupSubscription Source # 
Instance details

Defined in Proto.LndGrpc

Show ChannelBackup Source # 
Instance details

Defined in Proto.LndGrpc

Show ChannelAcceptResponse Source # 
Instance details

Defined in Proto.LndGrpc

Show ChannelAcceptRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show Channel Source # 
Instance details

Defined in Proto.LndGrpc

Show ChanPointShim Source # 
Instance details

Defined in Proto.LndGrpc

Show ChanInfoRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show ChanBackupSnapshot Source # 
Instance details

Defined in Proto.LndGrpc

Show ChanBackupExportRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show Chain Source # 
Instance details

Defined in Proto.LndGrpc

Methods

showsPrec :: Int -> Chain -> ShowS #

show :: Chain -> String #

showList :: [Chain] -> ShowS #

Show BakeMacaroonResponse Source # 
Instance details

Defined in Proto.LndGrpc

Show BakeMacaroonRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show Amount Source # 
Instance details

Defined in Proto.LndGrpc

Show AddressType Source # 
Instance details

Defined in Proto.LndGrpc

Show AddressType'UnrecognizedValue Source # 
Instance details

Defined in Proto.LndGrpc

Show AddInvoiceResponse Source # 
Instance details

Defined in Proto.LndGrpc

Show AbandonChannelResponse Source # 
Instance details

Defined in Proto.LndGrpc

Show AbandonChannelRequest Source # 
Instance details

Defined in Proto.LndGrpc

Show AMPRecord Source # 
Instance details

Defined in Proto.LndGrpc

Show AMP Source # 
Instance details

Defined in Proto.LndGrpc

Methods

showsPrec :: Int -> AMP -> ShowS #

show :: AMP -> String #

showList :: [AMP] -> ShowS #

Show SubscribeSingleInvoiceRequest Source # 
Instance details

Defined in Proto.InvoiceGrpc

Show SettleInvoiceResp Source # 
Instance details

Defined in Proto.InvoiceGrpc

Show SettleInvoiceMsg Source # 
Instance details

Defined in Proto.InvoiceGrpc

Show CancelInvoiceResp Source # 
Instance details

Defined in Proto.InvoiceGrpc

Show CancelInvoiceMsg Source # 
Instance details

Defined in Proto.InvoiceGrpc

Show AddHoldInvoiceResp Source # 
Instance details

Defined in Proto.InvoiceGrpc

Show AddHoldInvoiceRequest Source # 
Instance details

Defined in Proto.InvoiceGrpc

Show Encoding 
Instance details

Defined in Basement.String

Methods

showsPrec :: Int -> Encoding -> ShowS #

show :: Encoding -> String #

showList :: [Encoding] -> ShowS #

Show String 
Instance details

Defined in Basement.UTF8.Base

Methods

showsPrec :: Int -> String -> ShowS #

show :: String -> String0 #

showList :: [String] -> ShowS #

Show ASCII7_Invalid 
Instance details

Defined in Basement.String.Encoding.ASCII7

Methods

showsPrec :: Int -> ASCII7_Invalid -> ShowS #

show :: ASCII7_Invalid -> String #

showList :: [ASCII7_Invalid] -> ShowS #

Show ISO_8859_1_Invalid 
Instance details

Defined in Basement.String.Encoding.ISO_8859_1

Methods

showsPrec :: Int -> ISO_8859_1_Invalid -> ShowS #

show :: ISO_8859_1_Invalid -> String #

showList :: [ISO_8859_1_Invalid] -> ShowS #

Show UTF16_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF16

Methods

showsPrec :: Int -> UTF16_Invalid -> ShowS #

show :: UTF16_Invalid -> String #

showList :: [UTF16_Invalid] -> ShowS #

Show UTF32_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF32

Methods

showsPrec :: Int -> UTF32_Invalid -> ShowS #

show :: UTF32_Invalid -> String #

showList :: [UTF32_Invalid] -> ShowS #

Show FileSize 
Instance details

Defined in Basement.Types.OffsetSize

Methods

showsPrec :: Int -> FileSize -> ShowS #

show :: FileSize -> String #

showList :: [FileSize] -> ShowS #

Show CryptoError 
Instance details

Defined in Crypto.Error.Types

Methods

showsPrec :: Int -> CryptoError -> ShowS #

show :: CryptoError -> String #

showList :: [CryptoError] -> ShowS #

Show GrpcTimeoutSeconds Source # 
Instance details

Defined in LndClient.Data.Newtype

Show Seconds Source # 
Instance details

Defined in LndClient.Data.Newtype

Show AezeedPassphrase Source # 
Instance details

Defined in LndClient.Data.Newtype

Show CipherSeedMnemonic Source # 
Instance details

Defined in LndClient.Data.Newtype

Show Sat Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

showsPrec :: Int -> Sat -> ShowS #

show :: Sat -> String #

showList :: [Sat] -> ShowS #

Show MSat Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

showsPrec :: Int -> MSat -> ShowS #

show :: MSat -> String #

showList :: [MSat] -> ShowS #

Show RPreimage Source # 
Instance details

Defined in LndClient.Data.Newtype

Show RHash Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

showsPrec :: Int -> RHash -> ShowS #

show :: RHash -> String #

showList :: [RHash] -> ShowS #

Show PaymentRequest Source # 
Instance details

Defined in LndClient.Data.Newtype

Show SettleIndex Source # 
Instance details

Defined in LndClient.Data.Newtype

Show AddIndex Source # 
Instance details

Defined in LndClient.Data.Newtype

Show NodeLocation Source # 
Instance details

Defined in LndClient.Data.Newtype

Show NodePubKey Source # 
Instance details

Defined in LndClient.Data.Newtype

Show PEM 
Instance details

Defined in Data.PEM.Types

Methods

showsPrec :: Int -> PEM -> ShowS #

show :: PEM -> String #

showList :: [PEM] -> ShowS #

Show ASN1CharacterString 
Instance details

Defined in Data.ASN1.Types.String

Methods

showsPrec :: Int -> ASN1CharacterString -> ShowS #

show :: ASN1CharacterString -> String #

showList :: [ASN1CharacterString] -> ShowS #

Show HashALG 
Instance details

Defined in Data.X509.AlgorithmIdentifier

Methods

showsPrec :: Int -> HashALG -> ShowS #

show :: HashALG -> String #

showList :: [HashALG] -> ShowS #

Show PubKeyALG 
Instance details

Defined in Data.X509.AlgorithmIdentifier

Methods

showsPrec :: Int -> PubKeyALG -> ShowS #

show :: PubKeyALG -> String #

showList :: [PubKeyALG] -> ShowS #

Show SignatureALG 
Instance details

Defined in Data.X509.AlgorithmIdentifier

Methods

showsPrec :: Int -> SignatureALG -> ShowS #

show :: SignatureALG -> String #

showList :: [SignatureALG] -> ShowS #

Show CRL 
Instance details

Defined in Data.X509.CRL

Methods

showsPrec :: Int -> CRL -> ShowS #

show :: CRL -> String #

showList :: [CRL] -> ShowS #

Show RevokedCertificate 
Instance details

Defined in Data.X509.CRL

Methods

showsPrec :: Int -> RevokedCertificate -> ShowS #

show :: RevokedCertificate -> String #

showList :: [RevokedCertificate] -> ShowS #

Show Certificate 
Instance details

Defined in Data.X509.Cert

Methods

showsPrec :: Int -> Certificate -> ShowS #

show :: Certificate -> String #

showList :: [Certificate] -> ShowS #

Show CertificateChain 
Instance details

Defined in Data.X509.CertificateChain

Methods

showsPrec :: Int -> CertificateChain -> ShowS #

show :: CertificateChain -> String #

showList :: [CertificateChain] -> ShowS #

Show CertificateChainRaw 
Instance details

Defined in Data.X509.CertificateChain

Methods

showsPrec :: Int -> CertificateChainRaw -> ShowS #

show :: CertificateChainRaw -> String #

showList :: [CertificateChainRaw] -> ShowS #

Show DistinguishedName 
Instance details

Defined in Data.X509.DistinguishedName

Methods

showsPrec :: Int -> DistinguishedName -> ShowS #

show :: DistinguishedName -> String #

showList :: [DistinguishedName] -> ShowS #

Show DnElement 
Instance details

Defined in Data.X509.DistinguishedName

Methods

showsPrec :: Int -> DnElement -> ShowS #

show :: DnElement -> String #

showList :: [DnElement] -> ShowS #

Show AltName 
Instance details

Defined in Data.X509.Ext

Methods

showsPrec :: Int -> AltName -> ShowS #

show :: AltName -> String #

showList :: [AltName] -> ShowS #

Show DistributionPoint 
Instance details

Defined in Data.X509.Ext

Methods

showsPrec :: Int -> DistributionPoint -> ShowS #

show :: DistributionPoint -> String #

showList :: [DistributionPoint] -> ShowS #

Show ExtAuthorityKeyId 
Instance details

Defined in Data.X509.Ext

Methods

showsPrec :: Int -> ExtAuthorityKeyId -> ShowS #

show :: ExtAuthorityKeyId -> String #

showList :: [ExtAuthorityKeyId] -> ShowS #

Show ExtBasicConstraints 
Instance details

Defined in Data.X509.Ext

Methods

showsPrec :: Int -> ExtBasicConstraints -> ShowS #

show :: ExtBasicConstraints -> String #

showList :: [ExtBasicConstraints] -> ShowS #

Show ExtCrlDistributionPoints 
Instance details

Defined in Data.X509.Ext

Methods

showsPrec :: Int -> ExtCrlDistributionPoints -> ShowS #

show :: ExtCrlDistributionPoints -> String #

showList :: [ExtCrlDistributionPoints] -> ShowS #

Show ExtExtendedKeyUsage 
Instance details

Defined in Data.X509.Ext

Methods

showsPrec :: Int -> ExtExtendedKeyUsage -> ShowS #

show :: ExtExtendedKeyUsage -> String #

showList :: [ExtExtendedKeyUsage] -> ShowS #

Show ExtKeyUsage 
Instance details

Defined in Data.X509.Ext

Methods

showsPrec :: Int -> ExtKeyUsage -> ShowS #

show :: ExtKeyUsage -> String #

showList :: [ExtKeyUsage] -> ShowS #

Show ExtKeyUsageFlag 
Instance details

Defined in Data.X509.Ext

Methods

showsPrec :: Int -> ExtKeyUsageFlag -> ShowS #

show :: ExtKeyUsageFlag -> String #

showList :: [ExtKeyUsageFlag] -> ShowS #

Show ExtKeyUsagePurpose 
Instance details

Defined in Data.X509.Ext

Methods

showsPrec :: Int -> ExtKeyUsagePurpose -> ShowS #

show :: ExtKeyUsagePurpose -> String #

showList :: [ExtKeyUsagePurpose] -> ShowS #

Show ExtNetscapeComment 
Instance details

Defined in Data.X509.Ext

Methods

showsPrec :: Int -> ExtNetscapeComment -> ShowS #

show :: ExtNetscapeComment -> String #

showList :: [ExtNetscapeComment] -> ShowS #

Show ExtSubjectAltName 
Instance details

Defined in Data.X509.Ext

Methods

showsPrec :: Int -> ExtSubjectAltName -> ShowS #

show :: ExtSubjectAltName -> String #

showList :: [ExtSubjectAltName] -> ShowS #

Show ExtSubjectKeyId 
Instance details

Defined in Data.X509.Ext

Methods

showsPrec :: Int -> ExtSubjectKeyId -> ShowS #

show :: ExtSubjectKeyId -> String #

showList :: [ExtSubjectKeyId] -> ShowS #

Show ReasonFlag 
Instance details

Defined in Data.X509.Ext

Methods

showsPrec :: Int -> ReasonFlag -> ShowS #

show :: ReasonFlag -> String #

showList :: [ReasonFlag] -> ShowS #

Show ExtensionRaw 
Instance details

Defined in Data.X509.ExtensionRaw

Methods

showsPrec :: Int -> ExtensionRaw -> ShowS #

show :: ExtensionRaw -> String #

showList :: [ExtensionRaw] -> ShowS #

Show Extensions 
Instance details

Defined in Data.X509.ExtensionRaw

Methods

showsPrec :: Int -> Extensions -> ShowS #

show :: Extensions -> String #

showList :: [Extensions] -> ShowS #

Show PrivKey 
Instance details

Defined in Data.X509.PrivateKey

Methods

showsPrec :: Int -> PrivKey -> ShowS #

show :: PrivKey -> String #

showList :: [PrivKey] -> ShowS #

Show PrivKeyEC 
Instance details

Defined in Data.X509.PrivateKey

Methods

showsPrec :: Int -> PrivKeyEC -> ShowS #

show :: PrivKeyEC -> String #

showList :: [PrivKeyEC] -> ShowS #

Show PubKey 
Instance details

Defined in Data.X509.PublicKey

Methods

showsPrec :: Int -> PubKey -> ShowS #

show :: PubKey -> String #

showList :: [PubKey] -> ShowS #

Show PubKeyEC 
Instance details

Defined in Data.X509.PublicKey

Methods

showsPrec :: Int -> PubKeyEC -> ShowS #

show :: PubKeyEC -> String #

showList :: [PubKeyEC] -> ShowS #

Show SerializedPoint 
Instance details

Defined in Data.X509.PublicKey

Methods

showsPrec :: Int -> SerializedPoint -> ShowS #

show :: SerializedPoint -> String #

showList :: [SerializedPoint] -> ShowS #

Show SHA1 
Instance details

Defined in Crypto.Hash.SHA1

Methods

showsPrec :: Int -> SHA1 -> ShowS #

show :: SHA1 -> String #

showList :: [SHA1] -> ShowS #

Show MD5 
Instance details

Defined in Crypto.Hash.MD5

Methods

showsPrec :: Int -> MD5 -> ShowS #

show :: MD5 -> String #

showList :: [MD5] -> ShowS #

Show ASN1 
Instance details

Defined in Data.ASN1.Types

Methods

showsPrec :: Int -> ASN1 -> ShowS #

show :: ASN1 -> String #

showList :: [ASN1] -> ShowS #

Show Error 
Instance details

Defined in Env.Internal.Error

Methods

showsPrec :: Int -> Error -> ShowS #

show :: Error -> String #

showList :: [Error] -> ShowS #

Show PortNumber 
Instance details

Defined in Network.Socket.Types

Methods

showsPrec :: Int -> PortNumber -> ShowS #

show :: PortNumber -> String #

showList :: [PortNumber] -> ShowS #

Show ClientParams 
Instance details

Defined in Network.TLS.Parameters

Methods

showsPrec :: Int -> ClientParams -> ShowS #

show :: ClientParams -> String #

showList :: [ClientParams] -> ShowS #

Show RemoteSentGoAwayFrame 
Instance details

Defined in Network.HTTP2.Client.Dispatch

Methods

showsPrec :: Int -> RemoteSentGoAwayFrame -> ShowS #

show :: RemoteSentGoAwayFrame -> String #

showList :: [RemoteSentGoAwayFrame] -> ShowS #

Show FrameHeader 
Instance details

Defined in Network.HTTP2.Types

Methods

showsPrec :: Int -> FrameHeader -> ShowS #

show :: FrameHeader -> String #

showList :: [FrameHeader] -> ShowS #

Show FramePayload 
Instance details

Defined in Network.HTTP2.Types

Methods

showsPrec :: Int -> FramePayload -> ShowS #

show :: FramePayload -> String #

showList :: [FramePayload] -> ShowS #

Show Supported 
Instance details

Defined in Network.TLS.Parameters

Methods

showsPrec :: Int -> Supported -> ShowS #

show :: Supported -> String #

showList :: [Supported] -> ShowS #

Show ClientHooks 
Instance details

Defined in Network.TLS.Parameters

Methods

showsPrec :: Int -> ClientHooks -> ShowS #

show :: ClientHooks -> String #

showList :: [ClientHooks] -> ShowS #

Show GroupUsage 
Instance details

Defined in Network.TLS.Parameters

Methods

showsPrec :: Int -> GroupUsage -> ShowS #

show :: GroupUsage -> String #

showList :: [GroupUsage] -> ShowS #

Show TooMuchConcurrency 
Instance details

Defined in Network.HTTP2.Client

Methods

showsPrec :: Int -> TooMuchConcurrency -> ShowS #

show :: TooMuchConcurrency -> String #

showList :: [TooMuchConcurrency] -> ShowS #

Show StreamEvent 
Instance details

Defined in Network.HTTP2.Client.Dispatch

Methods

showsPrec :: Int -> StreamEvent -> ShowS #

show :: StreamEvent -> String #

showList :: [StreamEvent] -> ShowS #

Show HTTP2Error 
Instance details

Defined in Network.HTTP2.Types

Methods

showsPrec :: Int -> HTTP2Error -> ShowS #

show :: HTTP2Error -> String #

showList :: [HTTP2Error] -> ShowS #

Show ErrorCodeId 
Instance details

Defined in Network.HTTP2.Types

Methods

showsPrec :: Int -> ErrorCodeId -> ShowS #

show :: ErrorCodeId -> String #

showList :: [ErrorCodeId] -> ShowS #

Show Priority 
Instance details

Defined in Network.HTTP2.Types

Methods

showsPrec :: Int -> Priority -> ShowS #

show :: Priority -> String #

showList :: [Priority] -> ShowS #

Show AddrInfo 
Instance details

Defined in Network.Socket

Methods

showsPrec :: Int -> AddrInfo -> ShowS #

show :: AddrInfo -> String #

showList :: [AddrInfo] -> ShowS #

Show AddrInfoFlag 
Instance details

Defined in Network.Socket

Methods

showsPrec :: Int -> AddrInfoFlag -> ShowS #

show :: AddrInfoFlag -> String #

showList :: [AddrInfoFlag] -> ShowS #

Show NameInfoFlag 
Instance details

Defined in Network.Socket

Methods

showsPrec :: Int -> NameInfoFlag -> ShowS #

show :: NameInfoFlag -> String #

showList :: [NameInfoFlag] -> ShowS #

Show SocketOption 
Instance details

Defined in Network.Socket

Methods

showsPrec :: Int -> SocketOption -> ShowS #

show :: SocketOption -> String #

showList :: [SocketOption] -> ShowS #

Show Family 
Instance details

Defined in Network.Socket.Types

Methods

showsPrec :: Int -> Family -> ShowS #

show :: Family -> String #

showList :: [Family] -> ShowS #

Show Socket 
Instance details

Defined in Network.Socket.Types

Methods

showsPrec :: Int -> Socket -> ShowS #

show :: Socket -> String #

showList :: [Socket] -> ShowS #

Show SocketStatus 
Instance details

Defined in Network.Socket.Types

Methods

showsPrec :: Int -> SocketStatus -> ShowS #

show :: SocketStatus -> String #

showList :: [SocketStatus] -> ShowS #

Show SocketType 
Instance details

Defined in Network.Socket.Types

Methods

showsPrec :: Int -> SocketType -> ShowS #

show :: SocketType -> String #

showList :: [SocketType] -> ShowS #

Show Curve_Edwards25519 
Instance details

Defined in Crypto.ECC

Methods

showsPrec :: Int -> Curve_Edwards25519 -> ShowS #

show :: Curve_Edwards25519 -> String #

showList :: [Curve_Edwards25519] -> ShowS #

Show Curve_P256R1 
Instance details

Defined in Crypto.ECC

Methods

showsPrec :: Int -> Curve_P256R1 -> ShowS #

show :: Curve_P256R1 -> String #

showList :: [Curve_P256R1] -> ShowS #

Show Curve_P384R1 
Instance details

Defined in Crypto.ECC

Methods

showsPrec :: Int -> Curve_P384R1 -> ShowS #

show :: Curve_P384R1 -> String #

showList :: [Curve_P384R1] -> ShowS #

Show Curve_P521R1 
Instance details

Defined in Crypto.ECC

Methods

showsPrec :: Int -> Curve_P521R1 -> ShowS #

show :: Curve_P521R1 -> String #

showList :: [Curve_P521R1] -> ShowS #

Show Curve_X25519 
Instance details

Defined in Crypto.ECC

Methods

showsPrec :: Int -> Curve_X25519 -> ShowS #

show :: Curve_X25519 -> String #

showList :: [Curve_X25519] -> ShowS #

Show Curve_X448 
Instance details

Defined in Crypto.ECC

Methods

showsPrec :: Int -> Curve_X448 -> ShowS #

show :: Curve_X448 -> String #

showList :: [Curve_X448] -> ShowS #

Show Blake2b_160 
Instance details

Defined in Crypto.Hash.Blake2b

Methods

showsPrec :: Int -> Blake2b_160 -> ShowS #

show :: Blake2b_160 -> String #

showList :: [Blake2b_160] -> ShowS #

Show Blake2b_224 
Instance details

Defined in Crypto.Hash.Blake2b

Methods

showsPrec :: Int -> Blake2b_224 -> ShowS #

show :: Blake2b_224 -> String #

showList :: [Blake2b_224] -> ShowS #

Show Blake2b_256 
Instance details

Defined in Crypto.Hash.Blake2b

Methods

showsPrec :: Int -> Blake2b_256 -> ShowS #

show :: Blake2b_256 -> String #

showList :: [Blake2b_256] -> ShowS #

Show Blake2b_384 
Instance details

Defined in Crypto.Hash.Blake2b

Methods

showsPrec :: Int -> Blake2b_384 -> ShowS #

show :: Blake2b_384 -> String #

showList :: [Blake2b_384] -> ShowS #

Show Blake2b_512 
Instance details

Defined in Crypto.Hash.Blake2b

Methods

showsPrec :: Int -> Blake2b_512 -> ShowS #

show :: Blake2b_512 -> String #

showList :: [Blake2b_512] -> ShowS #

Show Blake2bp_512 
Instance details

Defined in Crypto.Hash.Blake2bp

Methods

showsPrec :: Int -> Blake2bp_512 -> ShowS #

show :: Blake2bp_512 -> String #

showList :: [Blake2bp_512] -> ShowS #

Show Blake2s_160 
Instance details

Defined in Crypto.Hash.Blake2s

Methods

showsPrec :: Int -> Blake2s_160 -> ShowS #

show :: Blake2s_160 -> String #

showList :: [Blake2s_160] -> ShowS #

Show Blake2s_224 
Instance details

Defined in Crypto.Hash.Blake2s

Methods

showsPrec :: Int -> Blake2s_224 -> ShowS #

show :: Blake2s_224 -> String #

showList :: [Blake2s_224] -> ShowS #

Show Blake2s_256 
Instance details

Defined in Crypto.Hash.Blake2s

Methods

showsPrec :: Int -> Blake2s_256 -> ShowS #

show :: Blake2s_256 -> String #

showList :: [Blake2s_256] -> ShowS #

Show Blake2sp_224 
Instance details

Defined in Crypto.Hash.Blake2sp

Methods

showsPrec :: Int -> Blake2sp_224 -> ShowS #

show :: Blake2sp_224 -> String #

showList :: [Blake2sp_224] -> ShowS #

Show Blake2sp_256 
Instance details

Defined in Crypto.Hash.Blake2sp

Methods

showsPrec :: Int -> Blake2sp_256 -> ShowS #

show :: Blake2sp_256 -> String #

showList :: [Blake2sp_256] -> ShowS #

Show Keccak_224 
Instance details

Defined in Crypto.Hash.Keccak

Methods

showsPrec :: Int -> Keccak_224 -> ShowS #

show :: Keccak_224 -> String #

showList :: [Keccak_224] -> ShowS #

Show Keccak_256 
Instance details

Defined in Crypto.Hash.Keccak

Methods

showsPrec :: Int -> Keccak_256 -> ShowS #

show :: Keccak_256 -> String #

showList :: [Keccak_256] -> ShowS #

Show Keccak_384 
Instance details

Defined in Crypto.Hash.Keccak

Methods

showsPrec :: Int -> Keccak_384 -> ShowS #

show :: Keccak_384 -> String #

showList :: [Keccak_384] -> ShowS #

Show Keccak_512 
Instance details

Defined in Crypto.Hash.Keccak

Methods

showsPrec :: Int -> Keccak_512 -> ShowS #

show :: Keccak_512 -> String #

showList :: [Keccak_512] -> ShowS #

Show MD2 
Instance details

Defined in Crypto.Hash.MD2

Methods

showsPrec :: Int -> MD2 -> ShowS #

show :: MD2 -> String #

showList :: [MD2] -> ShowS #

Show MD4 
Instance details

Defined in Crypto.Hash.MD4

Methods

showsPrec :: Int -> MD4 -> ShowS #

show :: MD4 -> String #

showList :: [MD4] -> ShowS #

Show RIPEMD160 
Instance details

Defined in Crypto.Hash.RIPEMD160

Methods

showsPrec :: Int -> RIPEMD160 -> ShowS #

show :: RIPEMD160 -> String #

showList :: [RIPEMD160] -> ShowS #

Show SHA224 
Instance details

Defined in Crypto.Hash.SHA224

Methods

showsPrec :: Int -> SHA224 -> ShowS #

show :: SHA224 -> String #

showList :: [SHA224] -> ShowS #

Show SHA256 
Instance details

Defined in Crypto.Hash.SHA256

Methods

showsPrec :: Int -> SHA256 -> ShowS #

show :: SHA256 -> String #

showList :: [SHA256] -> ShowS #

Show SHA3_224 
Instance details

Defined in Crypto.Hash.SHA3

Methods

showsPrec :: Int -> SHA3_224 -> ShowS #

show :: SHA3_224 -> String #

showList :: [SHA3_224] -> ShowS #

Show SHA3_256 
Instance details

Defined in Crypto.Hash.SHA3

Methods

showsPrec :: Int -> SHA3_256 -> ShowS #

show :: SHA3_256 -> String #

showList :: [SHA3_256] -> ShowS #

Show SHA3_384 
Instance details

Defined in Crypto.Hash.SHA3

Methods

showsPrec :: Int -> SHA3_384 -> ShowS #

show :: SHA3_384 -> String #

showList :: [SHA3_384] -> ShowS #

Show SHA3_512 
Instance details

Defined in Crypto.Hash.SHA3

Methods

showsPrec :: Int -> SHA3_512 -> ShowS #

show :: SHA3_512 -> String #

showList :: [SHA3_512] -> ShowS #

Show SHA384 
Instance details

Defined in Crypto.Hash.SHA384

Methods

showsPrec :: Int -> SHA384 -> ShowS #

show :: SHA384 -> String #

showList :: [SHA384] -> ShowS #

Show SHA512 
Instance details

Defined in Crypto.Hash.SHA512

Methods

showsPrec :: Int -> SHA512 -> ShowS #

show :: SHA512 -> String #

showList :: [SHA512] -> ShowS #

Show SHA512t_224 
Instance details

Defined in Crypto.Hash.SHA512t

Methods

showsPrec :: Int -> SHA512t_224 -> ShowS #

show :: SHA512t_224 -> String #

showList :: [SHA512t_224] -> ShowS #

Show SHA512t_256 
Instance details

Defined in Crypto.Hash.SHA512t

Methods

showsPrec :: Int -> SHA512t_256 -> ShowS #

show :: SHA512t_256 -> String #

showList :: [SHA512t_256] -> ShowS #

Show Skein256_224 
Instance details

Defined in Crypto.Hash.Skein256

Methods

showsPrec :: Int -> Skein256_224 -> ShowS #

show :: Skein256_224 -> String #

showList :: [Skein256_224] -> ShowS #

Show Skein256_256 
Instance details

Defined in Crypto.Hash.Skein256

Methods

showsPrec :: Int -> Skein256_256 -> ShowS #

show :: Skein256_256 -> String #

showList :: [Skein256_256] -> ShowS #

Show Skein512_224 
Instance details

Defined in Crypto.Hash.Skein512

Methods

showsPrec :: Int -> Skein512_224 -> ShowS #

show :: Skein512_224 -> String #

showList :: [Skein512_224] -> ShowS #

Show Skein512_256 
Instance details

Defined in Crypto.Hash.Skein512

Methods

showsPrec :: Int -> Skein512_256 -> ShowS #

show :: Skein512_256 -> String #

showList :: [Skein512_256] -> ShowS #

Show Skein512_384 
Instance details

Defined in Crypto.Hash.Skein512

Methods

showsPrec :: Int -> Skein512_384 -> ShowS #

show :: Skein512_384 -> String #

showList :: [Skein512_384] -> ShowS #

Show Skein512_512 
Instance details

Defined in Crypto.Hash.Skein512

Methods

showsPrec :: Int -> Skein512_512 -> ShowS #

show :: Skein512_512 -> String #

showList :: [Skein512_512] -> ShowS #

Show Tiger 
Instance details

Defined in Crypto.Hash.Tiger

Methods

showsPrec :: Int -> Tiger -> ShowS #

show :: Tiger -> String #

showList :: [Tiger] -> ShowS #

Show Whirlpool 
Instance details

Defined in Crypto.Hash.Whirlpool

Methods

showsPrec :: Int -> Whirlpool -> ShowS #

show :: Whirlpool -> String #

showList :: [Whirlpool] -> ShowS #

Show LndConfig Source # 
Instance details

Defined in LndClient.Data.LndEnv

Show GRPCStatus 
Instance details

Defined in Network.GRPC.HTTP2.Types

Methods

showsPrec :: Int -> GRPCStatus -> ShowS #

show :: GRPCStatus -> String #

showList :: [GRPCStatus] -> ShowS #

Show GRPCStatusCode 
Instance details

Defined in Network.GRPC.HTTP2.Types

Methods

showsPrec :: Int -> GRPCStatusCode -> ShowS #

show :: GRPCStatusCode -> String #

showList :: [GRPCStatusCode] -> ShowS #

Show InvalidGRPCStatus 
Instance details

Defined in Network.GRPC.HTTP2.Types

Methods

showsPrec :: Int -> InvalidGRPCStatus -> ShowS #

show :: InvalidGRPCStatus -> String #

showList :: [InvalidGRPCStatus] -> ShowS #

Show DebugParams 
Instance details

Defined in Network.TLS.Parameters

Methods

showsPrec :: Int -> DebugParams -> ShowS #

show :: DebugParams -> String #

showList :: [DebugParams] -> ShowS #

Show ServerHooks 
Instance details

Defined in Network.TLS.Parameters

Methods

showsPrec :: Int -> ServerHooks -> ShowS #

show :: ServerHooks -> String #

showList :: [ServerHooks] -> ShowS #

Show ServerParams 
Instance details

Defined in Network.TLS.Parameters

Methods

showsPrec :: Int -> ServerParams -> ShowS #

show :: ServerParams -> String #

showList :: [ServerParams] -> ShowS #

Show Shared 
Instance details

Defined in Network.TLS.Parameters

Methods

showsPrec :: Int -> Shared -> ShowS #

show :: Shared -> String #

showList :: [Shared] -> ShowS #

Show Settings 
Instance details

Defined in Network.HTTP2.Types

Methods

showsPrec :: Int -> Settings -> ShowS #

show :: Settings -> String #

showList :: [Settings] -> ShowS #

Show EncodeStrategy 
Instance details

Defined in Network.HPACK.Types

Methods

showsPrec :: Int -> EncodeStrategy -> ShowS #

show :: EncodeStrategy -> String #

showList :: [EncodeStrategy] -> ShowS #

Show ASN1ConstructionType 
Instance details

Defined in Data.ASN1.Types

Methods

showsPrec :: Int -> ASN1ConstructionType -> ShowS #

show :: ASN1ConstructionType -> String #

showList :: [ASN1ConstructionType] -> ShowS #

Show CertKeyUsage 
Instance details

Defined in Data.X509.Cert

Methods

showsPrec :: Int -> CertKeyUsage -> ShowS #

show :: CertKeyUsage -> String #

showList :: [CertKeyUsage] -> ShowS #

Show ASN1TimeType 
Instance details

Defined in Data.ASN1.Types

Methods

showsPrec :: Int -> ASN1TimeType -> ShowS #

show :: ASN1TimeType -> String #

showList :: [ASN1TimeType] -> ShowS #

Show ASN1StringEncoding 
Instance details

Defined in Data.ASN1.Types.String

Methods

showsPrec :: Int -> ASN1StringEncoding -> ShowS #

show :: ASN1StringEncoding -> String #

showList :: [ASN1StringEncoding] -> ShowS #

Show Frame 
Instance details

Defined in Network.HTTP2.Types

Methods

showsPrec :: Int -> Frame -> ShowS #

show :: Frame -> String #

showList :: [Frame] -> ShowS #

Show FrameTypeId 
Instance details

Defined in Network.HTTP2.Types

Methods

showsPrec :: Int -> FrameTypeId -> ShowS #

show :: FrameTypeId -> String #

showList :: [FrameTypeId] -> ShowS #

Show SettingsKeyId 
Instance details

Defined in Network.HTTP2.Types

Methods

showsPrec :: Int -> SettingsKeyId -> ShowS #

show :: SettingsKeyId -> String #

showList :: [SettingsKeyId] -> ShowS #

Show CompressionAlgo 
Instance details

Defined in Network.HPACK.Types

Methods

showsPrec :: Int -> CompressionAlgo -> ShowS #

show :: CompressionAlgo -> String #

showList :: [CompressionAlgo] -> ShowS #

Show DecodeError 
Instance details

Defined in Network.HPACK.Types

Methods

showsPrec :: Int -> DecodeError -> ShowS #

show :: DecodeError -> String #

showList :: [DecodeError] -> ShowS #

Show HIndex 
Instance details

Defined in Network.HPACK.Types

Methods

showsPrec :: Int -> HIndex -> ShowS #

show :: HIndex -> String #

showList :: [HIndex] -> ShowS #

Show InvalidParse 
Instance details

Defined in Network.GRPC.Client

Methods

showsPrec :: Int -> InvalidParse -> ShowS #

show :: InvalidParse -> String #

showList :: [InvalidParse] -> ShowS #

Show InvalidState 
Instance details

Defined in Network.GRPC.Client

Methods

showsPrec :: Int -> InvalidState -> ShowS #

show :: InvalidState -> String #

showList :: [InvalidState] -> ShowS #

Show StreamReplyDecodingError 
Instance details

Defined in Network.GRPC.Client

Methods

showsPrec :: Int -> StreamReplyDecodingError -> ShowS #

show :: StreamReplyDecodingError -> String #

showList :: [StreamReplyDecodingError] -> ShowS #

Show UnallowedPushPromiseReceived 
Instance details

Defined in Network.GRPC.Client

Methods

showsPrec :: Int -> UnallowedPushPromiseReceived -> ShowS #

show :: UnallowedPushPromiseReceived -> String #

showList :: [UnallowedPushPromiseReceived] -> ShowS #

Show SubscribeInvoicesRequest Source # 
Instance details

Defined in LndClient.Data.SubscribeInvoices

Show SendPaymentResponse Source # 
Instance details

Defined in LndClient.Data.SendPayment

Show SendPaymentRequest Source # 
Instance details

Defined in LndClient.Data.SendPayment

Show ConnectPeerRequest Source # 
Instance details

Defined in LndClient.Data.Peer

Show LightningAddress Source # 
Instance details

Defined in LndClient.Data.Peer

Show Peer Source # 
Instance details

Defined in LndClient.Data.Peer

Methods

showsPrec :: Int -> Peer -> ShowS #

show :: Peer -> String #

showList :: [Peer] -> ShowS #

Show Payment Source # 
Instance details

Defined in LndClient.Data.Payment

Show PayReq Source # 
Instance details

Defined in LndClient.Data.PayReq

Show AddHodlInvoiceRequest Source # 
Instance details

Defined in LndClient.Data.AddHodlInvoice

Show NewAddressResponse Source # 
Instance details

Defined in LndClient.Data.NewAddress

Show AddressType Source # 
Instance details

Defined in LndClient.Data.NewAddress

Show NewAddressRequest Source # 
Instance details

Defined in LndClient.Data.NewAddress

Show ListChannelsRequest Source # 
Instance details

Defined in LndClient.Data.ListChannels

Show InvoiceState Source # 
Instance details

Defined in LndClient.Data.Invoice

Show Invoice Source # 
Instance details

Defined in LndClient.Data.Invoice

Show ListInvoiceResponse Source # 
Instance details

Defined in LndClient.Data.ListInvoices

Show ListInvoiceRequest Source # 
Instance details

Defined in LndClient.Data.ListInvoices

Show GetInfoResponse Source # 
Instance details

Defined in LndClient.Data.GetInfo

Show ClosedChannelsRequest Source # 
Instance details

Defined in LndClient.Data.ClosedChannels

Show ChannelPoint Source # 
Instance details

Defined in LndClient.Data.ChannelPoint

Show PendingChannel Source # 
Instance details

Defined in LndClient.Data.PendingChannel

Show WaitingCloseChannel Source # 
Instance details

Defined in LndClient.Data.WaitingCloseChannel

Show PendingOpenChannel Source # 
Instance details

Defined in LndClient.Data.PendingOpenChannel

Show ForceClosedChannel Source # 
Instance details

Defined in LndClient.Data.ForceClosedChannel

Show ClosedChannel Source # 
Instance details

Defined in LndClient.Data.ClosedChannel

Show PendingChannelsResponse Source # 
Instance details

Defined in LndClient.Data.PendingChannels

Show Channel Source # 
Instance details

Defined in LndClient.Data.Channel

Show OpenStatusUpdate Source # 
Instance details

Defined in LndClient.Data.OpenChannel

Show OpenChannelRequest Source # 
Instance details

Defined in LndClient.Data.OpenChannel

Show ChannelCloseSummary Source # 
Instance details

Defined in LndClient.Data.CloseChannel

Show ChannelCloseUpdate Source # 
Instance details

Defined in LndClient.Data.CloseChannel

Show CloseStatusUpdate Source # 
Instance details

Defined in LndClient.Data.CloseChannel

Show CloseChannelRequest Source # 
Instance details

Defined in LndClient.Data.CloseChannel

Show UpdateChannel Source # 
Instance details

Defined in LndClient.Data.SubscribeChannelEvents

Show ChannelEventUpdate Source # 
Instance details

Defined in LndClient.Data.SubscribeChannelEvents

Show AddInvoiceResponse Source # 
Instance details

Defined in LndClient.Data.AddInvoice

Show AddInvoiceRequest Source # 
Instance details

Defined in LndClient.Data.AddInvoice

Show XImportMissionControlResponse Source # 
Instance details

Defined in Proto.RouterGrpc

Show XImportMissionControlRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Show UpdateChanStatusResponse Source # 
Instance details

Defined in Proto.RouterGrpc

Show UpdateChanStatusRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Show TrackPaymentRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Show SubscribeHtlcEventsRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Show SettleEvent Source # 
Instance details

Defined in Proto.RouterGrpc

Show SetMissionControlConfigResponse Source # 
Instance details

Defined in Proto.RouterGrpc

Show SetMissionControlConfigRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Show SendToRouteResponse Source # 
Instance details

Defined in Proto.RouterGrpc

Show SendToRouteRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Show SendPaymentRequest'DestCustomRecordsEntry Source # 
Instance details

Defined in Proto.RouterGrpc

Show SendPaymentRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Show RouteFeeResponse Source # 
Instance details

Defined in Proto.RouterGrpc

Show RouteFeeRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Show ResolveHoldForwardAction Source # 
Instance details

Defined in Proto.RouterGrpc

Show ResolveHoldForwardAction'UnrecognizedValue Source # 
Instance details

Defined in Proto.RouterGrpc

Show ResetMissionControlResponse Source # 
Instance details

Defined in Proto.RouterGrpc

Show ResetMissionControlRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Show QueryProbabilityResponse Source # 
Instance details

Defined in Proto.RouterGrpc

Show QueryProbabilityRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Show QueryMissionControlResponse Source # 
Instance details

Defined in Proto.RouterGrpc

Show QueryMissionControlRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Show PaymentStatus Source # 
Instance details

Defined in Proto.RouterGrpc

Show PaymentState Source # 
Instance details

Defined in Proto.RouterGrpc

Show PaymentState'UnrecognizedValue Source # 
Instance details

Defined in Proto.RouterGrpc

Show PairHistory Source # 
Instance details

Defined in Proto.RouterGrpc

Show PairData Source # 
Instance details

Defined in Proto.RouterGrpc

Show MissionControlConfig Source # 
Instance details

Defined in Proto.RouterGrpc

Show LinkFailEvent Source # 
Instance details

Defined in Proto.RouterGrpc

Show HtlcInfo Source # 
Instance details

Defined in Proto.RouterGrpc

Show HtlcEvent'EventType Source # 
Instance details

Defined in Proto.RouterGrpc

Show HtlcEvent'EventType'UnrecognizedValue Source # 
Instance details

Defined in Proto.RouterGrpc

Show HtlcEvent'Event Source # 
Instance details

Defined in Proto.RouterGrpc

Show HtlcEvent Source # 
Instance details

Defined in Proto.RouterGrpc

Show GetMissionControlConfigResponse Source # 
Instance details

Defined in Proto.RouterGrpc

Show GetMissionControlConfigRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Show ForwardHtlcInterceptResponse Source # 
Instance details

Defined in Proto.RouterGrpc

Show ForwardHtlcInterceptRequest'CustomRecordsEntry Source # 
Instance details

Defined in Proto.RouterGrpc

Show ForwardHtlcInterceptRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Show ForwardFailEvent Source # 
Instance details

Defined in Proto.RouterGrpc

Show ForwardEvent Source # 
Instance details

Defined in Proto.RouterGrpc

Show FailureDetail Source # 
Instance details

Defined in Proto.RouterGrpc

Show FailureDetail'UnrecognizedValue Source # 
Instance details

Defined in Proto.RouterGrpc

Show CircuitKey Source # 
Instance details

Defined in Proto.RouterGrpc

Show ChanStatusAction Source # 
Instance details

Defined in Proto.RouterGrpc

Show ChanStatusAction'UnrecognizedValue Source # 
Instance details

Defined in Proto.RouterGrpc

Show BuildRouteResponse Source # 
Instance details

Defined in Proto.RouterGrpc

Show BuildRouteRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Show TrackPaymentRequest Source # 
Instance details

Defined in LndClient.Data.TrackPayment

Show UnlockWalletResponse Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Show UnlockWalletRequest Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Show InitWalletResponse Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Show InitWalletRequest Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Show GenSeedResponse Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Show GenSeedRequest Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Show ChangePasswordResponse Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Show ChangePasswordRequest Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Show UnlockWalletRequest Source # 
Instance details

Defined in LndClient.Data.UnlockWallet

Show InitWalletRequest Source # 
Instance details

Defined in LndClient.Data.InitWallet

Show Block 
Instance details

Defined in Network.Bitcoin.BlockChain

Methods

showsPrec :: Int -> Block -> ShowS #

show :: Block -> String #

showList :: [Block] -> ShowS #

Show OutputInfo 
Instance details

Defined in Network.Bitcoin.BlockChain

Methods

showsPrec :: Int -> OutputInfo -> ShowS #

show :: OutputInfo -> String #

showList :: [OutputInfo] -> ShowS #

Show OutputSetInfo 
Instance details

Defined in Network.Bitcoin.BlockChain

Methods

showsPrec :: Int -> OutputSetInfo -> ShowS #

show :: OutputSetInfo -> String #

showList :: [OutputSetInfo] -> ShowS #

Show BlockTemplate 
Instance details

Defined in Network.Bitcoin.Mining

Methods

showsPrec :: Int -> BlockTemplate -> ShowS #

show :: BlockTemplate -> String #

showList :: [BlockTemplate] -> ShowS #

Show CoinBaseAux 
Instance details

Defined in Network.Bitcoin.Mining

Methods

showsPrec :: Int -> CoinBaseAux -> ShowS #

show :: CoinBaseAux -> String #

showList :: [CoinBaseAux] -> ShowS #

Show HashData 
Instance details

Defined in Network.Bitcoin.Mining

Methods

showsPrec :: Int -> HashData -> ShowS #

show :: HashData -> String #

showList :: [HashData] -> ShowS #

Show MiningInfo 
Instance details

Defined in Network.Bitcoin.Mining

Methods

showsPrec :: Int -> MiningInfo -> ShowS #

show :: MiningInfo -> String #

showList :: [MiningInfo] -> ShowS #

Show Transaction 
Instance details

Defined in Network.Bitcoin.Mining

Methods

showsPrec :: Int -> Transaction -> ShowS #

show :: Transaction -> String #

showList :: [Transaction] -> ShowS #

Show BitcoinException 
Instance details

Defined in Network.Bitcoin.Types

Methods

showsPrec :: Int -> BitcoinException -> ShowS #

show :: BitcoinException -> String #

showList :: [BitcoinException] -> ShowS #

Show Request 
Instance details

Defined in Network.HTTP.Client.Types

Methods

showsPrec :: Int -> Request -> ShowS #

show :: Request -> String #

showList :: [Request] -> ShowS #

Show URIAuth 
Instance details

Defined in Network.URI

Methods

showsPrec :: Int -> URIAuth -> ShowS #

show :: URIAuth -> String #

showList :: [URIAuth] -> ShowS #

Show CookieJar 
Instance details

Defined in Network.HTTP.Client.Types

Methods

showsPrec :: Int -> CookieJar -> ShowS #

show :: CookieJar -> String #

showList :: [CookieJar] -> ShowS #

Show ResponseClose 
Instance details

Defined in Network.HTTP.Client.Types

Methods

showsPrec :: Int -> ResponseClose -> ShowS #

show :: ResponseClose -> String #

showList :: [ResponseClose] -> ShowS #

Show HttpException 
Instance details

Defined in Network.HTTP.Client.Types

Methods

showsPrec :: Int -> HttpException -> ShowS #

show :: HttpException -> String #

showList :: [HttpException] -> ShowS #

Show Proxy 
Instance details

Defined in Network.HTTP.Client.Types

Methods

showsPrec :: Int -> Proxy -> ShowS #

show :: Proxy -> String #

showList :: [Proxy] -> ShowS #

Show Cookie 
Instance details

Defined in Network.HTTP.Client.Types

Methods

showsPrec :: Int -> Cookie -> ShowS #

show :: Cookie -> String #

showList :: [Cookie] -> ShowS #

Show URI 
Instance details

Defined in Network.URI

Methods

showsPrec :: Int -> URI -> ShowS #

show :: URI -> String #

showList :: [URI] -> ShowS #

Show StreamFileStatus 
Instance details

Defined in Network.HTTP.Client.Types

Methods

showsPrec :: Int -> StreamFileStatus -> ShowS #

show :: StreamFileStatus -> String #

showList :: [StreamFileStatus] -> ShowS #

Show HttpExceptionContent 
Instance details

Defined in Network.HTTP.Client.Types

Methods

showsPrec :: Int -> HttpExceptionContent -> ShowS #

show :: HttpExceptionContent -> String #

showList :: [HttpExceptionContent] -> ShowS #

Show ResponseTimeout 
Instance details

Defined in Network.HTTP.Client.Types

Methods

showsPrec :: Int -> ResponseTimeout -> ShowS #

show :: ResponseTimeout -> String #

showList :: [ResponseTimeout] -> ShowS #

Show ConnHost 
Instance details

Defined in Network.HTTP.Client.Types

Methods

showsPrec :: Int -> ConnHost -> ShowS #

show :: ConnHost -> String #

showList :: [ConnHost] -> ShowS #

Show ConnKey 
Instance details

Defined in Network.HTTP.Client.Types

Methods

showsPrec :: Int -> ConnKey -> ShowS #

show :: ConnKey -> String #

showList :: [ConnKey] -> ShowS #

Show HttpExceptionContentWrapper 
Instance details

Defined in Network.HTTP.Client.Types

Methods

showsPrec :: Int -> HttpExceptionContentWrapper -> ShowS #

show :: HttpExceptionContentWrapper -> String #

showList :: [HttpExceptionContentWrapper] -> ShowS #

Show StatusHeaders 
Instance details

Defined in Network.HTTP.Client.Types

Methods

showsPrec :: Int -> StatusHeaders -> ShowS #

show :: StatusHeaders -> String #

showList :: [StatusHeaders] -> ShowS #

Show BitcoinRpcError 
Instance details

Defined in Network.Bitcoin.Internal

Methods

showsPrec :: Int -> BitcoinRpcError -> ShowS #

show :: BitcoinRpcError -> String #

showList :: [BitcoinRpcError] -> ShowS #

Show DistinguishedNameInner 
Instance details

Defined in Data.X509.DistinguishedName

Methods

showsPrec :: Int -> DistinguishedNameInner -> ShowS #

show :: DistinguishedNameInner -> String #

showList :: [DistinguishedNameInner] -> 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 (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 (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 (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 (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 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 (ForeignPtr a)

Since: base-2.1

Instance details

Defined in GHC.ForeignPtr

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 (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 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 (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 m => Show (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Show a => Show (Option a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

showsPrec :: Int -> Option a -> ShowS #

show :: Option a -> String #

showList :: [Option 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 (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 (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 (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 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 (Down a)

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 (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 (Decoder a) 
Instance details

Defined in Data.Binary.Get.Internal

Methods

showsPrec :: Int -> Decoder a -> ShowS #

show :: Decoder a -> String #

showList :: [Decoder a] -> 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 (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 (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 (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 (AnnotDetails a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Show a => Show (Span a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

showsPrec :: Int -> Span a -> ShowS #

show :: Span a -> String #

showList :: [Span a] -> ShowS #

Show a => Show (MeridiemLocale a) 
Instance details

Defined in Chronos

Methods

showsPrec :: Int -> MeridiemLocale a -> ShowS #

show :: MeridiemLocale a -> String #

showList :: [MeridiemLocale 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 (Encoding' a) 
Instance details

Defined in Data.Aeson.Encoding.Internal

Methods

showsPrec :: Int -> Encoding' a -> ShowS #

show :: Encoding' a -> String #

showList :: [Encoding' a] -> ShowS #

(Show 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 => 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 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 (RB a) 
Instance details

Defined in Data.List.Extra

Methods

showsPrec :: Int -> RB a -> ShowS #

show :: RB a -> String #

showList :: [RB a] -> ShowS #

(Show (Key record), Show record) => Show (Entity record) 
Instance details

Defined in Database.Persist.Class.PersistEntity

Methods

showsPrec :: Int -> Entity record -> ShowS #

show :: Entity record -> String #

showList :: [Entity record] -> ShowS #

Show a => Show (Item a) 
Instance details

Defined in Katip.Core

Methods

showsPrec :: Int -> Item a -> ShowS #

show :: Item a -> String #

showList :: [Item a] -> ShowS #

Show a => Show (HashSet a) 
Instance details

Defined in Data.HashSet.Base

Methods

showsPrec :: Int -> HashSet a -> ShowS #

show :: HashSet a -> String #

showList :: [HashSet 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 (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 a => Show (DList a) 
Instance details

Defined in Data.DList

Methods

showsPrec :: Int -> DList a -> ShowS #

show :: DList a -> String #

showList :: [DList 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 (Array a) 
Instance details

Defined in Data.Primitive.Array

Methods

showsPrec :: Int -> Array a -> ShowS #

show :: Array a -> String #

showList :: [Array a] -> ShowS #

(Show a, Prim a) => Show (PrimArray a) 
Instance details

Defined in Data.Primitive.PrimArray

Methods

showsPrec :: Int -> PrimArray a -> ShowS #

show :: PrimArray a -> String #

showList :: [PrimArray a] -> ShowS #

Show a => Show (SmallArray a) 
Instance details

Defined in Data.Primitive.SmallArray

Methods

showsPrec :: Int -> SmallArray a -> ShowS #

show :: SmallArray a -> String #

showList :: [SmallArray a] -> ShowS #

(Show a, PrimUnlifted a) => Show (UnliftedArray a) 
Instance details

Defined in Data.Primitive.UnliftedArray

Methods

showsPrec :: Int -> UnliftedArray a -> ShowS #

show :: UnliftedArray a -> String #

showList :: [UnliftedArray 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 (FieldTypeDescriptor value) 
Instance details

Defined in Data.ProtoLens.Message

Methods

showsPrec :: Int -> FieldTypeDescriptor value -> ShowS #

show :: FieldTypeDescriptor value -> String #

showList :: [FieldTypeDescriptor value] -> ShowS #

Show (ScalarField value) 
Instance details

Defined in Data.ProtoLens.Message

Methods

showsPrec :: Int -> ScalarField value -> ShowS #

show :: ScalarField value -> String #

showList :: [ScalarField value] -> ShowS #

Show a => Show (Result a) 
Instance details

Defined in Codec.QRCode.Data.Result

Methods

showsPrec :: Int -> Result a -> ShowS #

show :: Result a -> String #

showList :: [Result a] -> ShowS #

Show s => Show (CI s) 
Instance details

Defined in Data.CaseInsensitive.Internal

Methods

showsPrec :: Int -> CI s -> ShowS #

show :: CI s -> String #

showList :: [CI s] -> ShowS #

Show a => Show (CryptoFailable a) 
Instance details

Defined in Crypto.Error.Types

Methods

showsPrec :: Int -> CryptoFailable a -> ShowS #

show :: CryptoFailable a -> String #

showList :: [CryptoFailable a] -> ShowS #

(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 (Offset ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

showsPrec :: Int -> Offset ty -> ShowS #

show :: Offset ty -> String #

showList :: [Offset ty] -> 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 #

(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 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 (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 (TxId a) Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

showsPrec :: Int -> TxId a -> ShowS #

show :: TxId a -> String #

showList :: [TxId a] -> ShowS #

Show (Vout a) Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

showsPrec :: Int -> Vout a -> ShowS #

show :: Vout a -> String #

showList :: [Vout a] -> ShowS #

(Show a, Eq a, ASN1Object a) => Show (Signed a) 
Instance details

Defined in Data.X509.Signed

Methods

showsPrec :: Int -> Signed a -> ShowS #

show :: Signed a -> String #

showList :: [Signed a] -> ShowS #

(Show a, Eq a, ASN1Object a) => Show (SignedExact a) 
Instance details

Defined in Data.X509.Signed

Methods

showsPrec :: Int -> SignedExact a -> ShowS #

show :: SignedExact a -> String #

showList :: [SignedExact a] -> ShowS #

Show (Digest a) 
Instance details

Defined in Crypto.Hash.Types

Methods

showsPrec :: Int -> Digest a -> ShowS #

show :: Digest a -> String #

showList :: [Digest a] -> ShowS #

Show (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 (PendingUpdate a) Source # 
Instance details

Defined in LndClient.Data.Channel

Show a => Show (BitcoinRpcResponse a) 
Instance details

Defined in Network.Bitcoin.Internal

Methods

showsPrec :: Int -> BitcoinRpcResponse a -> ShowS #

show :: BitcoinRpcResponse a -> String #

showList :: [BitcoinRpcResponse a] -> ShowS #

Show body => Show (Response body) 
Instance details

Defined in Network.HTTP.Client.Types

Methods

showsPrec :: Int -> Response body -> ShowS #

show :: Response body -> String #

showList :: [Response body] -> ShowS #

Show body => Show (HistoriedResponse body) 
Instance details

Defined in Network.HTTP.Client

Methods

showsPrec :: Int -> HistoriedResponse body -> ShowS #

show :: HistoriedResponse body -> String #

showList :: [HistoriedResponse body] -> ShowS #

(Show 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 (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 (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 (TypeRep a) 
Instance details

Defined in Data.Typeable.Internal

Methods

showsPrec :: Int -> TypeRep a -> ShowS #

show :: TypeRep a -> String #

showList :: [TypeRep a] -> 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 (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 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 (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 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 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 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 k, Show v) => Show (HashMap k v) 
Instance details

Defined in Data.HashMap.Base

Methods

showsPrec :: Int -> HashMap k v -> ShowS #

show :: HashMap k v -> String #

showList :: [HashMap k v] -> ShowS #

Show m => Show (Mon m a) 
Instance details

Defined in Env.Internal.Free

Methods

showsPrec :: Int -> Mon m a -> ShowS #

show :: Mon m a -> String #

showList :: [Mon m a] -> 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 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 #

Show a => Show (Const a b)

This instance would be equivalent to the derived instances of the Const newtype if the runConst 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 #

(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 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 #

(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 #

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 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 (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 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 (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 (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 (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 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 #

(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 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 (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 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 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 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 (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 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 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 (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 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
MonadFail []

Since: base-4.9.0.0

Instance details

Defined in Control.Monad.Fail

Methods

fail :: String -> [a] #

MonadFail Maybe

Since: base-4.9.0.0

Instance details

Defined in Control.Monad.Fail

Methods

fail :: String -> Maybe a #

MonadFail IO

Since: base-4.9.0.0

Instance details

Defined in Control.Monad.Fail

Methods

fail :: String -> IO a #

MonadFail Q 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

fail :: String -> Q a #

MonadFail ReadPrec

Since: base-4.9.0.0

Instance details

Defined in Text.ParserCombinators.ReadPrec

Methods

fail :: String -> ReadPrec a #

MonadFail ReadP

Since: base-4.9.0.0

Instance details

Defined in Text.ParserCombinators.ReadP

Methods

fail :: String -> ReadP a #

MonadFail Get 
Instance details

Defined in Data.Binary.Get.Internal

Methods

fail :: String -> Get a #

MonadFail Stream 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

fail :: String -> Stream a #

MonadFail Vector 
Instance details

Defined in Data.Vector

Methods

fail :: String -> Vector a #

MonadFail Parser 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fail :: String -> Parser a #

MonadFail P

Since: base-4.9.0.0

Instance details

Defined in Text.ParserCombinators.ReadP

Methods

fail :: String -> P a #

MonadFail Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fail :: String -> Result a #

MonadFail IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fail :: String -> IResult a #

MonadFail DList 
Instance details

Defined in Data.DList

Methods

fail :: String -> DList a #

MonadFail Parser 
Instance details

Defined in Data.ProtoLens.Encoding.Parser.Internal

Methods

fail :: String -> Parser a #

MonadFail Result 
Instance details

Defined in Codec.QRCode.Data.Result

Methods

fail :: String -> Result a #

MonadFail (ST s)

Since: base-4.11.0.0

Instance details

Defined in GHC.ST

Methods

fail :: String -> ST s 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 m => MonadFail (KatipT m) 
Instance details

Defined in Katip.Core

Methods

fail :: String -> KatipT m a #

MonadFail m => MonadFail (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

fail :: String -> KatipContextT m a #

MonadFail (Parser i) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

fail :: String -> Parser i a #

MonadFail m => MonadFail (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

fail :: String -> ResourceT m a #

MonadFail m => MonadFail (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

fail :: String -> LoggingT m a #

MonadFail m => MonadFail (NoLoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

fail :: String -> NoLoggingT 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 #

MonadFail m => MonadFail (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

fail :: String -> IdentityT 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 (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

fail :: String -> ReaderT 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 #

(Monoid w, MonadFail m) => MonadFail (AccumT w m) 
Instance details

Defined in Control.Monad.Trans.Accum

Methods

fail :: String -> AccumT w 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 Lens.Micro

Methods

fail :: String -> StateT s m a #

MonadFail m => MonadFail (ContT r m) 
Instance details

Defined in Control.Monad.Trans.Cont

Methods

fail :: String -> ContT r m a #

MonadFail m => MonadFail (ConduitT i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

fail :: String -> ConduitT i o 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
IsString ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

IsString ByteString 
Instance details

Defined in Data.ByteString.Internal

IsString Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Methods

fromString :: String -> Doc #

IsString Builder 
Instance details

Defined in Data.Text.Internal.Builder

Methods

fromString :: String -> Builder #

IsString Value 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fromString :: String -> Value #

IsString Environment 
Instance details

Defined in Katip.Core

Methods

fromString :: String -> Environment #

IsString LogStr 
Instance details

Defined in Katip.Core

Methods

fromString :: String -> LogStr #

IsString Namespace 
Instance details

Defined in Katip.Core

IsString String 
Instance details

Defined in Basement.UTF8.Base

Methods

fromString :: String0 -> String #

IsString ASN1CharacterString 
Instance details

Defined in Data.ASN1.Types.String

Methods

fromString :: String -> ASN1CharacterString #

IsString LndHost Source # 
Instance details

Defined in LndClient.Data.LndEnv

Methods

fromString :: String -> LndHost #

IsString LndHexMacaroon Source # 
Instance details

Defined in LndClient.Data.LndEnv

IsString LndWalletPassword Source # 
Instance details

Defined in LndClient.Data.LndEnv

IsString RequestBody 
Instance details

Defined in Network.HTTP.Client.Types

Methods

fromString :: String -> RequestBody #

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] #

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 #

IsString (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

fromString :: String -> Doc a #

a ~ Char => IsString (DList a) 
Instance details

Defined in Data.DList

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 s, FoldCase s) => IsString (CI s) 
Instance details

Defined in Data.CaseInsensitive.Internal

Methods

fromString :: String -> CI s #

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 #

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.

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 <*>.

(*>) :: f a -> f b -> f b infixl 4 #

Sequence actions, discarding the value of the first argument.

(<*) :: f a -> f b -> f a infixl 4 #

Sequence actions, discarding the value of the second argument.

Instances
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] #

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 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 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 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 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 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 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 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 Option

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

pure :: a -> Option a #

(<*>) :: Option (a -> b) -> Option a -> Option b #

liftA2 :: (a -> b -> c) -> Option a -> Option b -> Option c #

(*>) :: Option a -> Option b -> Option b #

(<*) :: Option a -> Option b -> Option a #

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 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 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 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 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 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 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 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 ReadPrec

Since: base-4.6.0.0

Instance details

Defined in Text.ParserCombinators.ReadPrec

Methods

pure :: a -> ReadPrec a #

(<*>) :: ReadPrec (a -> b) -> ReadPrec a -> ReadPrec b #

liftA2 :: (a -> b -> c) -> ReadPrec a -> ReadPrec b -> ReadPrec c #

(*>) :: ReadPrec a -> ReadPrec b -> ReadPrec b #

(<*) :: ReadPrec a -> ReadPrec b -> ReadPrec a #

Applicative 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 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 Get 
Instance details

Defined in Data.Binary.Get.Internal

Methods

pure :: a -> Get a #

(<*>) :: Get (a -> b) -> Get a -> Get b #

liftA2 :: (a -> b -> c) -> Get a -> Get b -> Get c #

(*>) :: Get a -> Get b -> Get b #

(<*) :: Get a -> Get b -> Get a #

Applicative 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 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 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 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 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 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 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 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 Concurrently 
Instance details

Defined in Control.Concurrent.Async

Methods

pure :: a -> Concurrently a #

(<*>) :: Concurrently (a -> b) -> Concurrently a -> Concurrently b #

liftA2 :: (a -> b -> c) -> Concurrently a -> Concurrently b -> Concurrently c #

(*>) :: Concurrently a -> Concurrently b -> Concurrently b #

(<*) :: Concurrently a -> Concurrently b -> Concurrently 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 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 Box 
Instance details

Defined in Data.Vector.Fusion.Util

Methods

pure :: a -> Box a #

(<*>) :: Box (a -> b) -> Box a -> Box b #

liftA2 :: (a -> b -> c) -> Box a -> Box b -> Box c #

(*>) :: Box a -> Box b -> Box b #

(<*) :: Box a -> Box b -> Box a #

Applicative DList 
Instance details

Defined in Data.DList

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 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 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 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 Parser 
Instance details

Defined in Data.ProtoLens.Encoding.Parser.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 Codec.QRCode.Data.Result

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 CryptoFailable 
Instance details

Defined in Crypto.Error.Types

Methods

pure :: a -> CryptoFailable a #

(<*>) :: CryptoFailable (a -> b) -> CryptoFailable a -> CryptoFailable b #

liftA2 :: (a -> b -> c) -> CryptoFailable a -> CryptoFailable b -> CryptoFailable c #

(*>) :: CryptoFailable a -> CryptoFailable b -> CryptoFailable b #

(<*) :: CryptoFailable a -> CryptoFailable b -> CryptoFailable a #

Applicative (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 (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 #

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) #

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 (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 (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 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 #

Applicative m => Applicative (KatipT m) 
Instance details

Defined in Katip.Core

Methods

pure :: a -> KatipT m a #

(<*>) :: KatipT m (a -> b) -> KatipT m a -> KatipT m b #

liftA2 :: (a -> b -> c) -> KatipT m a -> KatipT m b -> KatipT m c #

(*>) :: KatipT m a -> KatipT m b -> KatipT m b #

(<*) :: KatipT m a -> KatipT m b -> KatipT m a #

Applicative m => Applicative (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

pure :: a -> KatipContextT m a #

(<*>) :: KatipContextT m (a -> b) -> KatipContextT m a -> KatipContextT m b #

liftA2 :: (a -> b -> c) -> KatipContextT m a -> KatipContextT m b -> KatipContextT m c #

(*>) :: KatipContextT m a -> KatipContextT m b -> KatipContextT m b #

(<*) :: KatipContextT m a -> KatipContextT m b -> KatipContextT m a #

MonadUnliftIO m => Applicative (Conc m) 
Instance details

Defined in UnliftIO.Internals.Async

Methods

pure :: a -> Conc m a #

(<*>) :: Conc m (a -> b) -> Conc m a -> Conc m b #

liftA2 :: (a -> b -> c) -> Conc m a -> Conc m b -> Conc m c #

(*>) :: Conc m a -> Conc m b -> Conc m b #

(<*) :: Conc m a -> Conc m b -> Conc m a #

MonadUnliftIO m => Applicative (Concurrently m) 
Instance details

Defined in UnliftIO.Internals.Async

Methods

pure :: a -> Concurrently m a #

(<*>) :: Concurrently m (a -> b) -> Concurrently m a -> Concurrently m b #

liftA2 :: (a -> b -> c) -> Concurrently m a -> Concurrently m b -> Concurrently m c #

(*>) :: Concurrently m a -> Concurrently m b -> Concurrently m b #

(<*) :: Concurrently m a -> Concurrently m b -> Concurrently m a #

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 #

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 m => Applicative (NoLoggingT m) 
Instance details

Defined in Katip.Monadic

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 #

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 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 #

DRG gen => Applicative (MonadPseudoRandom gen) 
Instance details

Defined in Crypto.Random.Types

Methods

pure :: a -> MonadPseudoRandom gen a #

(<*>) :: MonadPseudoRandom gen (a -> b) -> MonadPseudoRandom gen a -> MonadPseudoRandom gen b #

liftA2 :: (a -> b -> c) -> MonadPseudoRandom gen a -> MonadPseudoRandom gen b -> MonadPseudoRandom gen c #

(*>) :: MonadPseudoRandom gen a -> MonadPseudoRandom gen b -> MonadPseudoRandom gen b #

(<*) :: MonadPseudoRandom gen a -> MonadPseudoRandom gen b -> MonadPseudoRandom gen 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 #

Monoid m => Applicative (Mon m) 
Instance details

Defined in Env.Internal.Free

Methods

pure :: a -> Mon m a #

(<*>) :: Mon m (a -> b) -> Mon m a -> Mon m b #

liftA2 :: (a -> b -> c) -> Mon m a -> Mon m b -> Mon m c #

(*>) :: Mon m a -> Mon m b -> Mon m b #

(<*) :: Mon m a -> Mon m b -> Mon m a #

Functor f => Applicative (Alt f) 
Instance details

Defined in Env.Internal.Free

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 #

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 #

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, 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 #

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 #

(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 (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 (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 #

(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 (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 #

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 #

(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 (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 (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 #

Applicative ((->) a :: Type -> Type)

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 #

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 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 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 #

(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 (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 #

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 #

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 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 #

(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 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 #

(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 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 #

(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 #

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 #

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 #

class Foldable (t :: Type -> Type) #

Data structures that can be folded.

For example, given a data type

data Tree a = Empty | Leaf a | Node (Tree a) a (Tree a)

a suitable instance would be

instance Foldable Tree where
   foldMap f Empty = mempty
   foldMap f (Leaf x) = f x
   foldMap f (Node l k r) = foldMap f l `mappend` f k `mappend` foldMap f r

This is suitable even for abstract types, as the monoid is assumed to satisfy the monoid laws. Alternatively, one could define foldr:

instance Foldable Tree where
   foldr f z Empty = z
   foldr f z (Leaf x) = f x z
   foldr f z (Node l k r) = foldr f (f k (foldr f z r)) l

Foldable instances are expected to satisfy the following laws:

foldr f z t = appEndo (foldMap (Endo . f) t ) z
foldl f z t = appEndo (getDual (foldMap (Dual . Endo . flip f) t)) z
fold = foldMap id
length = getSum . foldMap (Sum . const  1)

sum, product, maximum, and minimum should all be essentially equivalent to foldMap forms, such as

sum = getSum . foldMap Sum

but may be less defined.

If the type is also a Functor instance, it should satisfy

foldMap f = fold . fmap f

which implies that

foldMap f . fmap g = foldMap (f . g)

Minimal complete definition

foldMap | foldr

Instances
Foldable []

Since: base-2.1

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => [m] -> 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 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 #

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 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 #

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 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 #

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 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 #

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 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 #

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 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 #

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 #

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 Option

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

fold :: Monoid m => Option m -> m #

foldMap :: Monoid m => (a -> m) -> Option a -> m #

foldr :: (a -> b -> b) -> b -> Option a -> b #

foldr' :: (a -> b -> b) -> b -> Option a -> b #

foldl :: (b -> a -> b) -> b -> Option a -> b #

foldl' :: (b -> a -> b) -> b -> Option a -> b #

foldr1 :: (a -> a -> a) -> Option a -> a #

foldl1 :: (a -> a -> a) -> Option a -> a #

toList :: Option a -> [a] #

null :: Option a -> Bool #

length :: Option a -> Int #

elem :: Eq a => a -> Option a -> Bool #

maximum :: Ord a => Option a -> a #

minimum :: Ord a => Option a -> a #

sum :: Num a => Option a -> a #

product :: Num a => Option 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 #

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 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 #

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 #

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 #

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 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 #

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 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 #

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 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 #

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 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 #

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 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 #

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 IntMap 
Instance details

Defined in Data.IntMap.Internal

Methods

fold :: Monoid m => IntMap m -> 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 Tree 
Instance details

Defined in Data.Tree

Methods

fold :: Monoid m => Tree m -> 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 Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

fold :: Monoid m => Seq m -> 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 FingerTree 
Instance details

Defined in Data.Sequence.Internal

Methods

fold :: Monoid m => FingerTree m -> 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 Digit 
Instance details

Defined in Data.Sequence.Internal

Methods

fold :: Monoid m => Digit m -> 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 Node 
Instance details

Defined in Data.Sequence.Internal

Methods

fold :: Monoid m => Node m -> 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 Elem 
Instance details

Defined in Data.Sequence.Internal

Methods

fold :: Monoid m => Elem m -> 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 ViewL 
Instance details

Defined in Data.Sequence.Internal

Methods

fold :: Monoid m => ViewL m -> 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 #

foldr :: (a -> b -> b) -> b -> ViewR a -> b #

foldr' :: (a -> b -> b) -> b -> ViewR a -> b #

foldl :: (b -> a -> b) -> b -> ViewR a -> b #

foldl' :: (b -> a -> b) -> b -> ViewR a -> b #

foldr1 :: (a -> a -> a) -> ViewR a -> a #

foldl1 :: (a -> a -> a) -> ViewR a -> a #

toList :: ViewR a -> [a] #

null :: ViewR a -> Bool #

length :: ViewR a -> Int #

elem :: Eq a => a -> ViewR a -> Bool #

maximum :: Ord a => ViewR a -> a #

minimum :: Ord a => ViewR a -> a #

sum :: Num a => ViewR a -> a #

product :: Num a => ViewR a -> a #

Foldable Set 
Instance details

Defined in Data.Set.Internal

Methods

fold :: Monoid m => Set m -> m #

foldMap :: Monoid m => (a -> m) -> Set a -> m #

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 Vector 
Instance details

Defined in Data.Vector

Methods

fold :: Monoid m => Vector m -> 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 Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fold :: Monoid m => Result m -> 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 IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fold :: Monoid m => IResult m -> 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 HashSet 
Instance details

Defined in Data.HashSet.Base

Methods

fold :: Monoid m => HashSet m -> 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 DList 
Instance details

Defined in Data.DList

Methods

fold :: Monoid m => DList m -> 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 Array 
Instance details

Defined in Data.Primitive.Array

Methods

fold :: Monoid m => Array m -> 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 #

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 Hashed 
Instance details

Defined in Data.Hashable.Class

Methods

fold :: Monoid m => Hashed m -> 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 Result 
Instance details

Defined in Codec.QRCode.Data.Result

Methods

fold :: Monoid m => Result m -> 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 Response 
Instance details

Defined in Network.HTTP.Client.Types

Methods

fold :: Monoid m => Response m -> 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 HistoriedResponse 
Instance details

Defined in Network.HTTP.Client

Methods

fold :: Monoid m => HistoriedResponse m -> 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 (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 #

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 (V1 :: Type -> 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 #

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 (U1 :: Type -> 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 #

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 ((,) 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 #

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 (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 #

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 (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 #

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 (Proxy :: Type -> 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 #

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 (Map k) 
Instance details

Defined in Data.Map.Internal

Methods

fold :: Monoid m => Map k m -> m #

foldMap :: Monoid m => (a -> m) -> Map k a -> m #

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 (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 #

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 #

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.Base

Methods

fold :: Monoid m => HashMap k m -> 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 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 #

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 #

Foldable (URec Char :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => URec Char m -> m #

foldMap :: Monoid m => (a -> m) -> URec Char a -> m #

foldr :: (a -> b -> b) -> b -> URec Char a -> b #

foldr' :: (a -> b -> b) -> b -> URec Char a -> b #

foldl :: (b -> a -> b) -> b -> URec Char a -> b #

foldl' :: (b -> a -> b) -> b -> URec Char a -> b #

foldr1 :: (a -> a -> a) -> URec Char a -> a #

foldl1 :: (a -> a -> a) -> URec Char a -> a #

toList :: URec Char a -> [a] #

null :: URec Char a -> Bool #

length :: URec Char a -> Int #

elem :: Eq a => a -> URec Char a -> Bool #

maximum :: Ord a => URec Char a -> a #

minimum :: Ord a => URec Char a -> a #

sum :: Num a => URec Char a -> a #

product :: Num a => URec Char a -> a #

Foldable (URec Double :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => URec Double m -> m #

foldMap :: Monoid m => (a -> m) -> URec Double a -> m #

foldr :: (a -> b -> b) -> b -> URec Double a -> b #

foldr' :: (a -> b -> b) -> b -> URec Double a -> b #

foldl :: (b -> a -> b) -> b -> URec Double a -> b #

foldl' :: (b -> a -> b) -> b -> URec Double a -> b #

foldr1 :: (a -> a -> a) -> URec Double a -> a #

foldl1 :: (a -> a -> a) -> URec Double a -> a #

toList :: URec Double a -> [a] #

null :: URec Double a -> Bool #

length :: URec Double a -> Int #

elem :: Eq a => a -> URec Double a -> Bool #

maximum :: Ord a => URec Double a -> a #

minimum :: Ord a => URec Double a -> a #

sum :: Num a => URec Double a -> a #

product :: Num a => URec Double a -> a #

Foldable (URec Float :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => URec Float m -> m #

foldMap :: Monoid m => (a -> m) -> URec Float a -> m #

foldr :: (a -> b -> b) -> b -> URec Float a -> b #

foldr' :: (a -> b -> b) -> b -> URec Float a -> b #

foldl :: (b -> a -> b) -> b -> URec Float a -> b #

foldl' :: (b -> a -> b) -> b -> URec Float a -> b #

foldr1 :: (a -> a -> a) -> URec Float a -> a #

foldl1 :: (a -> a -> a) -> URec Float a -> a #

toList :: URec Float a -> [a] #

null :: URec Float a -> Bool #

length :: URec Float a -> Int #

elem :: Eq a => a -> URec Float a -> Bool #

maximum :: Ord a => URec Float a -> a #

minimum :: Ord a => URec Float a -> a #

sum :: Num a => URec Float a -> a #

product :: Num a => URec Float a -> a #

Foldable (URec Int :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => URec Int m -> m #

foldMap :: Monoid m => (a -> m) -> URec Int a -> m #

foldr :: (a -> b -> b) -> b -> URec Int a -> b #

foldr' :: (a -> b -> b) -> b -> URec Int a -> b #

foldl :: (b -> a -> b) -> b -> URec Int a -> b #

foldl' :: (b -> a -> b) -> b -> URec Int a -> b #

foldr1 :: (a -> a -> a) -> URec Int a -> a #

foldl1 :: (a -> a -> a) -> URec Int a -> a #

toList :: URec Int a -> [a] #

null :: URec Int a -> Bool #

length :: URec Int a -> Int #

elem :: Eq a => a -> URec Int a -> Bool #

maximum :: Ord a => URec Int a -> a #

minimum :: Ord a => URec Int a -> a #

sum :: Num a => URec Int a -> a #

product :: Num a => URec Int a -> a #

Foldable (URec Word :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => URec Word m -> m #

foldMap :: Monoid m => (a -> m) -> URec Word a -> m #

foldr :: (a -> b -> b) -> b -> URec Word a -> b #

foldr' :: (a -> b -> b) -> b -> URec Word a -> b #

foldl :: (b -> a -> b) -> b -> URec Word a -> b #

foldl' :: (b -> a -> b) -> b -> URec Word a -> b #

foldr1 :: (a -> a -> a) -> URec Word a -> a #

foldl1 :: (a -> a -> a) -> URec Word a -> a #

toList :: URec Word a -> [a] #

null :: URec Word a -> Bool #

length :: URec Word a -> Int #

elem :: Eq a => a -> URec Word a -> Bool #

maximum :: Ord a => URec Word a -> a #

minimum :: Ord a => URec Word a -> a #

sum :: Num a => URec Word a -> a #

product :: Num a => URec Word a -> a #

Foldable (URec (Ptr ()) :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => URec (Ptr ()) m -> m #

foldMap :: Monoid m => (a -> m) -> URec (Ptr ()) a -> m #

foldr :: (a -> b -> b) -> b -> URec (Ptr ()) a -> b #

foldr' :: (a -> b -> b) -> b -> URec (Ptr ()) a -> b #

foldl :: (b -> a -> b) -> b -> URec (Ptr ()) a -> b #

foldl' :: (b -> a -> b) -> b -> URec (Ptr ()) a -> b #

foldr1 :: (a -> a -> a) -> URec (Ptr ()) a -> a #

foldl1 :: (a -> a -> a) -> URec (Ptr ()) a -> a #

toList :: URec (Ptr ()) a -> [a] #

null :: URec (Ptr ()) a -> Bool #

length :: URec (Ptr ()) a -> Int #

elem :: Eq a => a -> URec (Ptr ()) a -> Bool #

maximum :: Ord a => URec (Ptr ()) a -> a #

minimum :: Ord a => URec (Ptr ()) a -> a #

sum :: Num a => URec (Ptr ()) a -> a #

product :: Num a => URec (Ptr ()) a -> a #

Foldable (Const m :: Type -> 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 #

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 #

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 #

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 (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 #

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 (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 #

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 #

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 (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 #

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 #

foldr :: (a -> b -> b) -> b -> WriterT w f a -> b #

foldr' :: (a -> b -> b) -> b -> WriterT w f a -> b #

foldl :: (b -> a -> b) -> b -> WriterT w f a -> b #

foldl' :: (b -> a -> b) -> b -> WriterT w f a -> b #

foldr1 :: (a -> a -> a) -> WriterT w f a -> a #

foldl1 :: (a -> a -> a) -> WriterT w f a -> a #

toList :: WriterT w f a -> [a] #

null :: WriterT w f a -> Bool #

length :: WriterT w f a -> Int #

elem :: Eq a => a -> WriterT w f a -> Bool #

maximum :: Ord a => WriterT w f a -> a #

minimum :: Ord a => WriterT w f a -> a #

sum :: Num a => WriterT w f a -> a #

product :: Num a => WriterT w f a -> a #

Foldable (Constant a :: Type -> Type) 
Instance details

Defined in Data.Functor.Constant

Methods

fold :: Monoid m => Constant a m -> m #

foldMap :: Monoid m => (a0 -> m) -> Constant a a0 -> m #

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 (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 #

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 (K1 i c :: Type -> 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 #

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 (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 #

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 #

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 (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 #

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 #

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 (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 #

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 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 #

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 (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 #

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 (Clown f a :: Type -> Type) 
Instance details

Defined in Data.Bifunctor.Clown

Methods

fold :: Monoid m => Clown f a m -> m #

foldMap :: Monoid m => (a0 -> m) -> Clown f a a0 -> m #

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 #

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 #

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 #

(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 #

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 #

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 traversed from left to right.

A definition of traverse must satisfy the following laws:

naturality
t . traverse f = traverse (t . f) for every applicative transformation t
identity
traverse Identity = Identity
composition
traverse (Compose . fmap g . f) = Compose . fmap (traverse g) . traverse f

A definition of sequenceA must satisfy the following laws:

naturality
t . sequenceA = sequenceA . fmap t for every applicative transformation t
identity
sequenceA . fmap Identity = Identity
composition
sequenceA . fmap Compose = Compose . fmap sequenceA . sequenceA

where an applicative transformation is a function

t :: (Applicative f, Applicative g) => f a -> g a

preserving the Applicative operations, i.e.

and the identity functor Identity and composition of functors Compose are defined as

  newtype Identity a = Identity a

  instance Functor Identity where
    fmap f (Identity x) = Identity (f x)

  instance Applicative Identity where
    pure x = Identity x
    Identity f <*> Identity x = Identity (f x)

  newtype Compose f g a = Compose (f (g a))

  instance (Functor f, Functor g) => Functor (Compose f g) where
    fmap f (Compose x) = Compose (fmap (fmap f) x)

  instance (Applicative f, Applicative g) => Applicative (Compose f g) where
    pure x = Compose (pure (pure x))
    Compose f <*> Compose x = Compose ((<*>) <$> f <*> x)

(The naturality law is implied by parametricity.)

Instances are similar to Functor, e.g. given a data type

data Tree a = Empty | Leaf a | Node (Tree a) a (Tree a)

a suitable instance would be

instance Traversable Tree where
   traverse f Empty = pure Empty
   traverse f (Leaf x) = Leaf <$> f x
   traverse f (Node l k r) = Node <$> traverse f l <*> f k <*> traverse f r

This is suitable even for abstract types, as the laws for <*> imply a form of associativity.

The superclass instances should satisfy the following:

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_.

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_.

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_.

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_.

Instances
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 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 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 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 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 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 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 Option

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

traverse :: Applicative f => (a -> f b) -> Option a -> f (Option b) #

sequenceA :: Applicative f => Option (f a) -> f (Option a) #

mapM :: Monad m => (a -> m b) -> Option a -> m (Option b) #

sequence :: Monad m => Option (m a) -> m (Option 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 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 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 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 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 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 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 IntMap 
Instance details

Defined in Data.IntMap.Internal

Methods

traverse :: Applicative f => (a -> f b) -> IntMap a -> f (IntMap b) #

sequenceA :: Applicative f => IntMap (f a) -> f (IntMap a) #

mapM :: Monad m => (a -> m b) -> IntMap a -> m (IntMap b) #

sequence :: Monad m => IntMap (m a) -> m (IntMap a) #

Traversable 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 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 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 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 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 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 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 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 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 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 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 Result 
Instance details

Defined in Codec.QRCode.Data.Result

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 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 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 (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 (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 (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 ((,) 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) #

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 (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) #

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 (Map k) 
Instance details

Defined in Data.Map.Internal

Methods

traverse :: Applicative f => (a -> f b) -> Map k a -> f (Map k b) #

sequenceA :: Applicative f => Map k (f a) -> f (Map k a) #

mapM :: Monad m => (a -> m b) -> Map k a -> m (Map k b) #

sequence :: Monad m => Map k (m a) -> m (Map k a) #

Traversable f => Traversable (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.Base

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 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) #

Traversable (URec Char :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> URec Char a -> f (URec Char b) #

sequenceA :: Applicative f => URec Char (f a) -> f (URec Char a) #

mapM :: Monad m => (a -> m b) -> URec Char a -> m (URec Char b) #

sequence :: Monad m => URec Char (m a) -> m (URec Char a) #

Traversable (URec Double :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> URec Double a -> f (URec Double b) #

sequenceA :: Applicative f => URec Double (f a) -> f (URec Double a) #

mapM :: Monad m => (a -> m b) -> URec Double a -> m (URec Double b) #

sequence :: Monad m => URec Double (m a) -> m (URec Double a) #

Traversable (URec Float :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> URec Float a -> f (URec Float b) #

sequenceA :: Applicative f => URec Float (f a) -> f (URec Float a) #

mapM :: Monad m => (a -> m b) -> URec Float a -> m (URec Float b) #

sequence :: Monad m => URec Float (m a) -> m (URec Float a) #

Traversable (URec Int :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> URec Int a -> f (URec Int b) #

sequenceA :: Applicative f => URec Int (f a) -> f (URec Int a) #

mapM :: Monad m => (a -> m b) -> URec Int a -> m (URec Int b) #

sequence :: Monad m => URec Int (m a) -> m (URec Int a) #

Traversable (URec Word :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> URec Word a -> f (URec Word b) #

sequenceA :: Applicative f => URec Word (f a) -> f (URec Word a) #

mapM :: Monad m => (a -> m b) -> URec Word a -> m (URec Word b) #

sequence :: Monad m => URec Word (m a) -> m (URec Word a) #

Traversable (URec (Ptr ()) :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> URec (Ptr ()) a -> f (URec (Ptr ()) b) #

sequenceA :: Applicative f => URec (Ptr ()) (f a) -> f (URec (Ptr ()) a) #

mapM :: Monad m => (a -> m b) -> URec (Ptr ()) a -> m (URec (Ptr ()) b) #

sequence :: Monad m => URec (Ptr ()) (m a) -> m (URec (Ptr ()) a) #

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 (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 (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 (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 (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 (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 (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 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 (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 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 (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 (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) #

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) #

(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 where #

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

Associated Types

type Rep a :: Type -> Type #

Generic representation type

Methods

from :: a -> Rep a x #

Convert from the datatype to its representation

to :: Rep a x -> a #

Convert from the representation to the datatype

Instances
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 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 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 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 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 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 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 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 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 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 InjectivityAnn 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep InjectivityAnn :: Type -> Type #

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 () 
Instance details

Defined in GHC.Generics

Associated Types

type Rep () :: Type -> Type #

Methods

from :: () -> Rep () x #

to :: Rep () x -> () #

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 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 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 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 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 Associativity 
Instance details

Defined in GHC.Generics

Associated Types

type Rep Associativity :: Type -> Type #

Generic SourceUnpackedness 
Instance details

Defined in GHC.Generics

Associated Types

type Rep SourceUnpackedness :: Type -> Type #

Generic SourceStrictness 
Instance details

Defined in GHC.Generics

Associated Types

type Rep SourceStrictness :: Type -> Type #

Generic DecidedStrictness 
Instance details

Defined in GHC.Generics

Associated Types

type Rep DecidedStrictness :: Type -> Type #

Generic Extension 
Instance details

Defined in GHC.LanguageExtensions.Type

Associated Types

type Rep Extension :: Type -> Type #

Generic ForeignSrcLang 
Instance details

Defined in GHC.ForeignSrcLang.Type

Associated Types

type Rep ForeignSrcLang :: 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 TextDetails 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Associated Types

type Rep TextDetails :: Type -> Type #

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 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 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 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 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 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 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 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 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 ModuleInfo 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep ModuleInfo :: 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 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 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 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 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 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 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 TypeFamilyHead 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep TypeFamilyHead :: Type -> Type #

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 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 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 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 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 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 RuleMatch 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep RuleMatch :: 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 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 AnnTarget 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep AnnTarget :: Type -> Type #

Generic SourceUnpackedness 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep SourceUnpackedness :: Type -> Type #

Generic SourceStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep SourceStrictness :: Type -> Type #

Generic DecidedStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep DecidedStrictness :: Type -> Type #

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 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 PatSynDir 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep PatSynDir :: Type -> Type #

Generic PatSynArgs 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep PatSynArgs :: Type -> Type #

Generic TyVarBndr 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep TyVarBndr :: Type -> Type #

Generic FamilyResultSig 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep FamilyResultSig :: Type -> Type #

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 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 AnnLookup 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep AnnLookup :: 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 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 CompressionLevel 
Instance details

Defined in Codec.Compression.Zlib.Stream

Associated Types

type Rep CompressionLevel :: Type -> Type #

Generic WindowBits 
Instance details

Defined in Codec.Compression.Zlib.Stream

Associated Types

type Rep WindowBits :: Type -> Type #

Generic MemoryLevel 
Instance details

Defined in Codec.Compression.Zlib.Stream

Associated Types

type Rep MemoryLevel :: Type -> Type #

Generic CompressionStrategy 
Instance details

Defined in Codec.Compression.Zlib.Stream

Associated Types

type Rep CompressionStrategy :: Type -> Type #

Generic OffsetFormat 
Instance details

Defined in Chronos

Associated Types

type Rep OffsetFormat :: Type -> Type #

Methods

from :: OffsetFormat -> Rep OffsetFormat x #

to :: Rep OffsetFormat x -> OffsetFormat #

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 Clock 
Instance details

Defined in System.Clock

Associated Types

type Rep Clock :: Type -> Type #

Methods

from :: Clock -> Rep Clock x #

to :: Rep Clock x -> Clock #

Generic Environment 
Instance details

Defined in Katip.Core

Associated Types

type Rep Environment :: Type -> Type #

Methods

from :: Environment -> Rep Environment x #

to :: Rep Environment x -> Environment #

Generic LogStr 
Instance details

Defined in Katip.Core

Associated Types

type Rep LogStr :: Type -> Type #

Methods

from :: LogStr -> Rep LogStr x #

to :: Rep LogStr x -> LogStr #

Generic Namespace 
Instance details

Defined in Katip.Core

Associated Types

type Rep Namespace :: Type -> Type #

Generic Severity 
Instance details

Defined in Katip.Core

Associated Types

type Rep Severity :: Type -> Type #

Methods

from :: Severity -> Rep Severity x #

to :: Rep Severity x -> Severity #

Generic Verbosity 
Instance details

Defined in Katip.Core

Associated Types

type Rep Verbosity :: Type -> Type #

Generic Undefined 
Instance details

Defined in Universum.Debug

Associated Types

type Rep Undefined :: Type -> Type #

Generic ConcException 
Instance details

Defined in UnliftIO.Internals.Async

Associated Types

type Rep ConcException :: Type -> Type #

Methods

from :: ConcException -> Rep ConcException x #

to :: Rep ConcException x -> ConcException #

Generic TimeSpec 
Instance details

Defined in System.Clock

Associated Types

type Rep TimeSpec :: Type -> Type #

Methods

from :: TimeSpec -> Rep TimeSpec x #

to :: Rep TimeSpec x -> TimeSpec #

Generic ConstructorInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep ConstructorInfo :: Type -> Type #

Methods

from :: ConstructorInfo -> Rep ConstructorInfo x #

to :: Rep ConstructorInfo x -> ConstructorInfo #

Generic ConstructorVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep ConstructorVariant :: Type -> Type #

Methods

from :: ConstructorVariant -> Rep ConstructorVariant x #

to :: Rep ConstructorVariant x -> ConstructorVariant #

Generic DatatypeInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep DatatypeInfo :: Type -> Type #

Methods

from :: DatatypeInfo -> Rep DatatypeInfo x #

to :: Rep DatatypeInfo x -> DatatypeInfo #

Generic DatatypeVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep DatatypeVariant :: Type -> Type #

Methods

from :: DatatypeVariant -> Rep DatatypeVariant x #

to :: Rep DatatypeVariant x -> DatatypeVariant #

Generic FieldStrictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep FieldStrictness :: Type -> Type #

Methods

from :: FieldStrictness -> Rep FieldStrictness x #

to :: Rep FieldStrictness x -> FieldStrictness #

Generic Strictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep Strictness :: Type -> Type #

Methods

from :: Strictness -> Rep Strictness x #

to :: Rep Strictness x -> Strictness #

Generic Unpackedness 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep Unpackedness :: Type -> Type #

Methods

from :: Unpackedness -> Rep Unpackedness x #

to :: Rep Unpackedness x -> Unpackedness #

Generic RawConfig Source # 
Instance details

Defined in LndClient.Data.LndEnv

Associated Types

type Rep RawConfig :: Type -> Type #

Generic RpcName Source # 
Instance details

Defined in LndClient.RPC.Generic

Associated Types

type Rep RpcName :: Type -> Type #

Methods

from :: RpcName -> Rep RpcName x #

to :: Rep RpcName x -> RpcName #

Generic ListChannelsRequest Source # 
Instance details

Defined in LndClient.Data.ListChannels

Associated Types

type Rep ListChannelsRequest :: Type -> Type #

Generic ListInvoiceResponse Source # 
Instance details

Defined in LndClient.Data.ListInvoices

Associated Types

type Rep ListInvoiceResponse :: Type -> Type #

Generic ListInvoiceRequest Source # 
Instance details

Defined in LndClient.Data.ListInvoices

Associated Types

type Rep ListInvoiceRequest :: Type -> Type #

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 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 [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 (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 (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 (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 (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 (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 (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 (WrappedMonoid m) 
Instance details

Defined in Data.Semigroup

Associated Types

type Rep (WrappedMonoid m) :: Type -> Type #

Generic (Option a) 
Instance details

Defined in Data.Semigroup

Associated Types

type Rep (Option a) :: Type -> Type #

Methods

from :: Option a -> Rep (Option a) x #

to :: Rep (Option a) x -> Option 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 (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 (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 (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 (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 (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 (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 (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 (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 (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 (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 (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 (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 (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 (Key record), Generic record) => Generic (Entity record) 
Instance details

Defined in Database.Persist.Class.PersistEntity

Associated Types

type Rep (Entity record) :: Type -> Type #

Methods

from :: Entity record -> Rep (Entity record) x #

to :: Rep (Entity record) x -> Entity record #

Generic (Item a) 
Instance details

Defined in Katip.Core

Associated Types

type Rep (Item a) :: Type -> Type #

Methods

from :: Item a -> Rep (Item a) x #

to :: Rep (Item a) x -> Item a #

Generic (Result a) 
Instance details

Defined in Codec.QRCode.Data.Result

Associated Types

type Rep (Result a) :: Type -> Type #

Methods

from :: Result a -> Rep (Result a) x #

to :: Rep (Result a) x -> Result a #

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 (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 (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 (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 (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 (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 (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 (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 (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 (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 (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 (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 (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 (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 ((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 (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 (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 (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 ((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 (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 (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 (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 (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 (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 (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, 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 (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 (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 #

class KnownNat (n :: Nat) #

This class gives the integer associated with a type-level natural. There are instances of the class for every concrete literal: 0, 1, 2, etc.

Since: base-4.7.0.0

Minimal complete definition

natSing

class IsLabel (x :: Symbol) a where #

Methods

fromLabel :: a #

Instances
SymbolToField sym rec typ => IsLabel sym (EntityField rec typ) 
Instance details

Defined in Database.Persist.Class.PersistEntity

Methods

fromLabel :: EntityField rec typ #

class Semigroup a where #

The class of semigroups (types with an associative binary operation).

Instances should satisfy the associativity law:

Since: base-4.9.0.0

Minimal complete definition

(<>)

Methods

(<>) :: a -> a -> a infixr 6 #

An associative operation.

sconcat :: NonEmpty a -> a #

Reduce a non-empty list with <>

The default definition should be sufficient, but this can be overridden for efficiency.

stimes :: Integral b => b -> a -> a #

Repeat a value n times.

Given that this works on a Semigroup it is allowed to fail if you request 0 or fewer repetitions, and the default definition will do so.

By making this a member of the class, idempotent semigroups and monoids can upgrade this to execute in O(1) by picking stimes = stimesIdempotent or stimes = stimesIdempotentMonoid respectively.

Instances
Semigroup Ordering

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Semigroup ()

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

(<>) :: () -> () -> () #

sconcat :: NonEmpty () -> () #

stimes :: Integral b => b -> () -> () #

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 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 ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Semigroup ByteString 
Instance details

Defined in Data.ByteString.Internal

Semigroup Builder 
Instance details

Defined in Data.ByteString.Builder.Internal

Semigroup IntSet

Since: containers-0.5.7

Instance details

Defined in Data.IntSet.Internal

Semigroup Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Methods

(<>) :: Doc -> Doc -> Doc #

sconcat :: NonEmpty Doc -> Doc #

stimes :: Integral b => b -> Doc -> Doc #

Semigroup Builder 
Instance details

Defined in Data.Text.Internal.Builder

Semigroup Timespan 
Instance details

Defined in Chronos

Semigroup More 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

(<>) :: More -> More -> More #

sconcat :: NonEmpty More -> More #

stimes :: Integral b => b -> More -> More #

Semigroup ByteArray 
Instance details

Defined in Data.Primitive.ByteArray

Methods

(<>) :: ByteArray -> ByteArray -> ByteArray #

sconcat :: NonEmpty ByteArray -> ByteArray #

stimes :: Integral b => b -> ByteArray -> ByteArray #

Semigroup Series 
Instance details

Defined in Data.Aeson.Encoding.Internal

Methods

(<>) :: Series -> Series -> Series #

sconcat :: NonEmpty Series -> Series #

stimes :: Integral b => b -> Series -> Series #

Semigroup LogStr 
Instance details

Defined in Katip.Core

Methods

(<>) :: LogStr -> LogStr -> LogStr #

sconcat :: NonEmpty LogStr -> LogStr #

stimes :: Integral b => b -> LogStr -> LogStr #

Semigroup Namespace 
Instance details

Defined in Katip.Core

Semigroup PayloadSelection 
Instance details

Defined in Katip.Core

Methods

(<>) :: PayloadSelection -> PayloadSelection -> PayloadSelection #

sconcat :: NonEmpty PayloadSelection -> PayloadSelection #

stimes :: Integral b => b -> PayloadSelection -> PayloadSelection #

Semigroup Scribe 
Instance details

Defined in Katip.Core

Methods

(<>) :: Scribe -> Scribe -> Scribe #

sconcat :: NonEmpty Scribe -> Scribe #

stimes :: Integral b => b -> Scribe -> Scribe #

Semigroup SimpleLogPayload 
Instance details

Defined in Katip.Core

Methods

(<>) :: SimpleLogPayload -> SimpleLogPayload -> SimpleLogPayload #

sconcat :: NonEmpty SimpleLogPayload -> SimpleLogPayload #

stimes :: Integral b => b -> SimpleLogPayload -> SimpleLogPayload #

Semigroup LogContexts 
Instance details

Defined in Katip.Monadic

Semigroup Registry 
Instance details

Defined in Data.ProtoLens.Message

Methods

(<>) :: Registry -> Registry -> Registry #

sconcat :: NonEmpty Registry -> Registry #

stimes :: Integral b => b -> Registry -> Registry #

Semigroup String 
Instance details

Defined in Basement.UTF8.Base

Methods

(<>) :: String -> String -> String #

sconcat :: NonEmpty String -> String #

stimes :: Integral b => b -> String -> String #

Semigroup DistinguishedName 
Instance details

Defined in Data.X509.DistinguishedName

Methods

(<>) :: DistinguishedName -> DistinguishedName -> DistinguishedName #

sconcat :: NonEmpty DistinguishedName -> DistinguishedName #

stimes :: Integral b => b -> DistinguishedName -> DistinguishedName #

Semigroup CookieJar 
Instance details

Defined in Network.HTTP.Client.Types

Methods

(<>) :: CookieJar -> CookieJar -> CookieJar #

sconcat :: NonEmpty CookieJar -> CookieJar #

stimes :: Integral b => b -> CookieJar -> CookieJar #

Semigroup RequestBody 
Instance details

Defined in Network.HTTP.Client.Types

Methods

(<>) :: RequestBody -> RequestBody -> RequestBody #

sconcat :: NonEmpty RequestBody -> RequestBody #

stimes :: Integral b => b -> RequestBody -> RequestBody #

Semigroup [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 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 (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 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 #

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 #

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 #

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 #

Monoid m => Semigroup (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Semigroup a => Semigroup (Option a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(<>) :: Option a -> Option a -> Option a #

sconcat :: NonEmpty (Option a) -> Option a #

stimes :: Integral b => b -> Option a -> Option 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 #

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 (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 (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 #

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 #

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 (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 (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 #

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 (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 (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 #

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 #

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 #

Semigroup a => Semigroup (Concurrently a) 
Instance details

Defined in Control.Concurrent.Async

Methods

(<>) :: Concurrently a -> Concurrently a -> Concurrently a #

sconcat :: NonEmpty (Concurrently a) -> Concurrently a #

stimes :: Integral b => b -> Concurrently a -> Concurrently 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 (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 #

(Hashable a, Eq a) => Semigroup (HashSet a) 
Instance details

Defined in Data.HashSet.Base

Methods

(<>) :: HashSet a -> HashSet a -> HashSet a #

sconcat :: NonEmpty (HashSet a) -> HashSet a #

stimes :: Integral b => b -> HashSet a -> HashSet 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 (DList a) 
Instance details

Defined in Data.DList

Methods

(<>) :: DList a -> DList a -> DList a #

sconcat :: NonEmpty (DList a) -> DList a #

stimes :: Integral b => b -> DList a -> DList 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 (Array a) 
Instance details

Defined in Data.Primitive.Array

Methods

(<>) :: Array a -> Array a -> Array a #

sconcat :: NonEmpty (Array a) -> Array a #

stimes :: Integral b => b -> Array a -> Array a #

Semigroup (PrimArray a) 
Instance details

Defined in Data.Primitive.PrimArray

Methods

(<>) :: PrimArray a -> PrimArray a -> PrimArray a #

sconcat :: NonEmpty (PrimArray a) -> PrimArray a #

stimes :: Integral b => b -> PrimArray a -> PrimArray a #

Semigroup (SmallArray a) 
Instance details

Defined in Data.Primitive.SmallArray

Methods

(<>) :: SmallArray a -> SmallArray a -> SmallArray a #

sconcat :: NonEmpty (SmallArray a) -> SmallArray a #

stimes :: Integral b => b -> SmallArray a -> SmallArray a #

PrimUnlifted a => Semigroup (UnliftedArray a) 
Instance details

Defined in Data.Primitive.UnliftedArray

Methods

(<>) :: UnliftedArray a -> UnliftedArray a -> UnliftedArray a #

sconcat :: NonEmpty (UnliftedArray a) -> UnliftedArray a #

stimes :: Integral b => b -> UnliftedArray a -> UnliftedArray 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 #

Semigroup a => Semigroup (Result a) 
Instance details

Defined in Codec.QRCode.Data.Result

Methods

(<>) :: Result a -> Result a -> Result a #

sconcat :: NonEmpty (Result a) -> Result a #

stimes :: Integral b => b -> Result a -> Result a #

Semigroup s => Semigroup (CI s) 
Instance details

Defined in Data.CaseInsensitive.Internal

Methods

(<>) :: CI s -> CI s -> CI s #

sconcat :: NonEmpty (CI s) -> CI s #

stimes :: Integral b => b -> CI s -> CI s #

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 (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 (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 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 (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 (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 (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 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 (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 #

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 #

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 #

(Eq k, Hashable k) => Semigroup (HashMap k v) 
Instance details

Defined in Data.HashMap.Base

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 #

(MonadUnliftIO m, Semigroup a) => Semigroup (Conc m a) 
Instance details

Defined in UnliftIO.Internals.Async

Methods

(<>) :: Conc m a -> Conc m a -> Conc m a #

sconcat :: NonEmpty (Conc m a) -> Conc m a #

stimes :: Integral b => b -> Conc m a -> Conc m a #

(MonadUnliftIO m, Semigroup a) => Semigroup (Concurrently m a) 
Instance details

Defined in UnliftIO.Internals.Async

Methods

(<>) :: Concurrently m a -> Concurrently m a -> Concurrently m a #

sconcat :: NonEmpty (Concurrently m a) -> Concurrently m a #

stimes :: Integral b => b -> Concurrently m a -> Concurrently m a #

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 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 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 (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 (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 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 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 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 #

(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 #

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 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 #

(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 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) #

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 (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 (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 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 laws:

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

mappend :: a -> a -> a #

An associative operation

NOTE: This method is redundant and has the default implementation mappend = '(<>)' since base-4.11.0.0.

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.

Instances
Monoid Ordering

Since: base-2.1

Instance details

Defined in GHC.Base

Monoid ()

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

mempty :: () #

mappend :: () -> () -> () #

mconcat :: [()] -> () #

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 ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Monoid ByteString 
Instance details

Defined in Data.ByteString.Internal

Monoid Builder 
Instance details

Defined in Data.ByteString.Builder.Internal

Monoid IntSet 
Instance details

Defined in Data.IntSet.Internal

Monoid Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Methods

mempty :: Doc #

mappend :: Doc -> Doc -> Doc #

mconcat :: [Doc] -> Doc #

Monoid Builder 
Instance details

Defined in Data.Text.Internal.Builder

Monoid Timespan 
Instance details

Defined in Chronos

Monoid More 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

mempty :: More #

mappend :: More -> More -> More #

mconcat :: [More] -> More #

Monoid ByteArray 
Instance details

Defined in Data.Primitive.ByteArray

Methods

mempty :: ByteArray #

mappend :: ByteArray -> ByteArray -> ByteArray #

mconcat :: [ByteArray] -> ByteArray #

Monoid Series 
Instance details

Defined in Data.Aeson.Encoding.Internal

Methods

mempty :: Series #

mappend :: Series -> Series -> Series #

mconcat :: [Series] -> Series #

Monoid LogStr 
Instance details

Defined in Katip.Core

Methods

mempty :: LogStr #

mappend :: LogStr -> LogStr -> LogStr #

mconcat :: [LogStr] -> LogStr #

Monoid Namespace 
Instance details

Defined in Katip.Core

Monoid PayloadSelection 
Instance details

Defined in Katip.Core

Methods

mempty :: PayloadSelection #

mappend :: PayloadSelection -> PayloadSelection -> PayloadSelection #

mconcat :: [PayloadSelection] -> PayloadSelection #

Monoid Scribe 
Instance details

Defined in Katip.Core

Methods

mempty :: Scribe #

mappend :: Scribe -> Scribe -> Scribe #

mconcat :: [Scribe] -> Scribe #

Monoid SimpleLogPayload 
Instance details

Defined in Katip.Core

Methods

mempty :: SimpleLogPayload #

mappend :: SimpleLogPayload -> SimpleLogPayload -> SimpleLogPayload #

mconcat :: [SimpleLogPayload] -> SimpleLogPayload #

Monoid LogContexts 
Instance details

Defined in Katip.Monadic

Monoid Registry 
Instance details

Defined in Data.ProtoLens.Message

Methods

mempty :: Registry #

mappend :: Registry -> Registry -> Registry #

mconcat :: [Registry] -> Registry #

Monoid String 
Instance details

Defined in Basement.UTF8.Base

Methods

mempty :: String #

mappend :: String -> String -> String #

mconcat :: [String] -> String #

Monoid DistinguishedName 
Instance details

Defined in Data.X509.DistinguishedName

Methods

mempty :: DistinguishedName #

mappend :: DistinguishedName -> DistinguishedName -> DistinguishedName #

mconcat :: [DistinguishedName] -> DistinguishedName #

Monoid CookieJar 
Instance details

Defined in Network.HTTP.Client.Types

Methods

mempty :: CookieJar #

mappend :: CookieJar -> CookieJar -> CookieJar #

mconcat :: [CookieJar] -> CookieJar #

Monoid RequestBody 
Instance details

Defined in Network.HTTP.Client.Types

Methods

mempty :: RequestBody #

mappend :: RequestBody -> RequestBody -> RequestBody #

mconcat :: [RequestBody] -> RequestBody #

Monoid [a]

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

mempty :: [a] #

mappend :: [a] -> [a] -> [a] #

mconcat :: [[a]] -> [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 (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 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 #

(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 #

(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 #

Monoid m => Monoid (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Semigroup a => Monoid (Option a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

mempty :: Option a #

mappend :: Option a -> Option a -> Option a #

mconcat :: [Option a] -> Option a #

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 #

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 (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 (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 #

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 #

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 #

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 #

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 (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 (Vector a) 
Instance details

Defined in Data.Vector

Methods

mempty :: Vector a #

mappend :: Vector a -> Vector a -> Vector a #

mconcat :: [Vector a] -> Vector 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 #

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 #

(Semigroup a, Monoid a) => Monoid (Concurrently a) 
Instance details

Defined in Control.Concurrent.Async

Methods

mempty :: Concurrently a #

mappend :: Concurrently a -> Concurrently a -> Concurrently a #

mconcat :: [Concurrently a] -> Concurrently 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 (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 #

(Hashable a, Eq a) => Monoid (HashSet a) 
Instance details

Defined in Data.HashSet.Base

Methods

mempty :: HashSet a #

mappend :: HashSet a -> HashSet a -> HashSet a #

mconcat :: [HashSet a] -> HashSet 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 (DList a) 
Instance details

Defined in Data.DList

Methods

mempty :: DList a #

mappend :: DList a -> DList a -> DList a #

mconcat :: [DList a] -> DList 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 #

Monoid (Array a) 
Instance details

Defined in Data.Primitive.Array

Methods

mempty :: Array a #

mappend :: Array a -> Array a -> Array a #

mconcat :: [Array a] -> Array a #

Monoid (PrimArray a) 
Instance details

Defined in Data.Primitive.PrimArray

Methods

mempty :: PrimArray a #

mappend :: PrimArray a -> PrimArray a -> PrimArray a #

mconcat :: [PrimArray a] -> PrimArray a #

Monoid (SmallArray a) 
Instance details

Defined in Data.Primitive.SmallArray

Methods

mempty :: SmallArray a #

mappend :: SmallArray a -> SmallArray a -> SmallArray a #

mconcat :: [SmallArray a] -> SmallArray a #

PrimUnlifted a => Monoid (UnliftedArray a) 
Instance details

Defined in Data.Primitive.UnliftedArray

Methods

mempty :: UnliftedArray a #

mappend :: UnliftedArray a -> UnliftedArray a -> UnliftedArray a #

mconcat :: [UnliftedArray a] -> UnliftedArray 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 #

Monoid a => Monoid (Result a) 
Instance details

Defined in Codec.QRCode.Data.Result

Methods

mempty :: Result a #

mappend :: Result a -> Result a -> Result a #

mconcat :: [Result a] -> Result a #

Monoid s => Monoid (CI s) 
Instance details

Defined in Data.CaseInsensitive.Internal

Methods

mempty :: CI s #

mappend :: CI s -> CI s -> CI s #

mconcat :: [CI s] -> CI s #

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 (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 (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 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 (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 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 (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 #

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 #

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 #

(Eq k, Hashable k) => Monoid (HashMap k v) 
Instance details

Defined in Data.HashMap.Base

Methods

mempty :: HashMap k v #

mappend :: HashMap k v -> HashMap k v -> HashMap k v #

mconcat :: [HashMap k v] -> HashMap k v #

(Monoid a, MonadUnliftIO m) => Monoid (Conc m a) 
Instance details

Defined in UnliftIO.Internals.Async

Methods

mempty :: Conc m a #

mappend :: Conc m a -> Conc m a -> Conc m a #

mconcat :: [Conc m a] -> Conc m a #

(Semigroup a, Monoid a, MonadUnliftIO m) => Monoid (Concurrently m a) 
Instance details

Defined in UnliftIO.Internals.Async

Methods

mempty :: Concurrently m a #

mappend :: Concurrently m a -> Concurrently m a -> Concurrently m a #

mconcat :: [Concurrently m a] -> Concurrently m 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 (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 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 (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 (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 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 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 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 #

(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 #

(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 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 #

(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 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) #

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 (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 (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 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
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] #

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 #

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 #

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 #

Lift Bool 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Bool -> Q Exp #

SingKind Bool

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Associated Types

type DemoteRep Bool :: Type

Methods

fromSing :: Sing a -> DemoteRep 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 () #

Bits Bool

Interpret Bool as 1-bit bit-field

Since: base-4.7.0.0

Instance details

Defined in Data.Bits

FiniteBits Bool

Since: base-4.7.0.0

Instance details

Defined in Data.Bits

NFData Bool 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Bool -> () #

FromJSON Bool 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Bool #

parseJSONList :: Value -> Parser [Bool] #

FromJSONKey Bool 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction Bool

fromJSONKeyList :: FromJSONKeyFunction [Bool]

Hashable Bool 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Bool -> Int #

hash :: Bool -> Int

ToJSON Bool 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Bool -> Value

toEncoding :: Bool -> Encoding

toJSONList :: [Bool] -> Value

toEncodingList :: [Bool] -> Encoding

ToJSONKey Bool 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction Bool

toJSONKeyList :: ToJSONKeyFunction [Bool]

Unbox Bool 
Instance details

Defined in Data.Vector.Unboxed.Base

PersistField Bool 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Bool -> PersistValue

fromPersistValue :: PersistValue -> Either Text Bool

PersistFieldSql Bool 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Bool -> SqlType

FieldDefault Bool 
Instance details

Defined in Data.ProtoLens.Message

Methods

fieldDefault :: Bool

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

MVector MVector Bool 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s Bool -> Int

basicUnsafeSlice :: Int -> Int -> MVector s Bool -> MVector s Bool

basicOverlaps :: MVector s Bool -> MVector s Bool -> Bool

basicUnsafeNew :: PrimMonad m => Int -> m (MVector (PrimState m) Bool)

basicInitialize :: PrimMonad m => MVector (PrimState m) Bool -> m ()

basicUnsafeReplicate :: PrimMonad m => Int -> Bool -> m (MVector (PrimState m) Bool)

basicUnsafeRead :: PrimMonad m => MVector (PrimState m) Bool -> Int -> m Bool

basicUnsafeWrite :: PrimMonad m => MVector (PrimState m) Bool -> Int -> Bool -> m ()

basicClear :: PrimMonad m => MVector (PrimState m) Bool -> m ()

basicSet :: PrimMonad m => MVector (PrimState m) Bool -> Bool -> m ()

basicUnsafeCopy :: PrimMonad m => MVector (PrimState m) Bool -> MVector (PrimState m) Bool -> m ()

basicUnsafeMove :: PrimMonad m => MVector (PrimState m) Bool -> MVector (PrimState m) Bool -> m ()

basicUnsafeGrow :: PrimMonad m => MVector (PrimState m) Bool -> Int -> m (MVector (PrimState m) Bool)

Vector Vector Bool 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: PrimMonad m => Mutable Vector (PrimState m) Bool -> m (Vector Bool)

basicUnsafeThaw :: PrimMonad m => Vector Bool -> m (Mutable Vector (PrimState m) Bool)

basicLength :: Vector Bool -> Int

basicUnsafeSlice :: Int -> Int -> Vector Bool -> Vector Bool

basicUnsafeIndexM :: Monad m => Vector Bool -> Int -> m Bool

basicUnsafeCopy :: PrimMonad m => Mutable Vector (PrimState m) Bool -> Vector Bool -> m ()

elemseq :: Vector Bool -> Bool -> b -> b

HasField VerifyMessageResponse "valid" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "valid" -> (Bool -> f Bool) -> VerifyMessageResponse -> f VerifyMessageResponse

HasField SendRequest "allowSelfPayment" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "allowSelfPayment" -> (Bool -> f Bool) -> SendRequest -> f SendRequest

HasField SendManyRequest "spendUnconfirmed" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "spendUnconfirmed" -> (Bool -> f Bool) -> SendManyRequest -> f SendManyRequest

HasField SendCoinsRequest "sendAll" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "sendAll" -> (Bool -> f Bool) -> SendCoinsRequest -> f SendCoinsRequest

HasField SendCoinsRequest "spendUnconfirmed" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "spendUnconfirmed" -> (Bool -> f Bool) -> SendCoinsRequest -> f SendCoinsRequest

HasField RoutingPolicy "disabled" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "disabled" -> (Bool -> f Bool) -> RoutingPolicy -> f RoutingPolicy

HasField QueryRoutesRequest "useMissionControl" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "useMissionControl" -> (Bool -> f Bool) -> QueryRoutesRequest -> f QueryRoutesRequest

HasField PsbtShim "noPublish" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "noPublish" -> (Bool -> f Bool) -> PsbtShim -> f PsbtShim

HasField PolicyUpdateRequest "global" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "global" -> (Bool -> f Bool) -> PolicyUpdateRequest -> f PolicyUpdateRequest

HasField PolicyUpdateRequest "minHtlcMsatSpecified" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "minHtlcMsatSpecified" -> (Bool -> f Bool) -> PolicyUpdateRequest -> f PolicyUpdateRequest

HasField PendingHTLC "incoming" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "incoming" -> (Bool -> f Bool) -> PendingHTLC -> f PendingHTLC

HasField Peer "inbound" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "inbound" -> (Bool -> f Bool) -> Peer -> f Peer

HasField OpenChannelRequest "private" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "private" -> (Bool -> f Bool) -> OpenChannelRequest -> f OpenChannelRequest

HasField OpenChannelRequest "spendUnconfirmed" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "spendUnconfirmed" -> (Bool -> f Bool) -> OpenChannelRequest -> f OpenChannelRequest

HasField NodeInfoRequest "includeChannels" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "includeChannels" -> (Bool -> f Bool) -> NodeInfoRequest -> f NodeInfoRequest

HasField ListPeersRequest "latestError" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "latestError" -> (Bool -> f Bool) -> ListPeersRequest -> f ListPeersRequest

HasField ListPaymentsRequest "includeIncomplete" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "includeIncomplete" -> (Bool -> f Bool) -> ListPaymentsRequest -> f ListPaymentsRequest

HasField ListPaymentsRequest "reversed" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "reversed" -> (Bool -> f Bool) -> ListPaymentsRequest -> f ListPaymentsRequest

HasField ListInvoiceRequest "pendingOnly" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "pendingOnly" -> (Bool -> f Bool) -> ListInvoiceRequest -> f ListInvoiceRequest

HasField ListInvoiceRequest "reversed" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "reversed" -> (Bool -> f Bool) -> ListInvoiceRequest -> f ListInvoiceRequest

HasField ListChannelsRequest "activeOnly" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "activeOnly" -> (Bool -> f Bool) -> ListChannelsRequest -> f ListChannelsRequest

HasField ListChannelsRequest "inactiveOnly" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "inactiveOnly" -> (Bool -> f Bool) -> ListChannelsRequest -> f ListChannelsRequest

HasField ListChannelsRequest "privateOnly" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "privateOnly" -> (Bool -> f Bool) -> ListChannelsRequest -> f ListChannelsRequest

HasField ListChannelsRequest "publicOnly" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "publicOnly" -> (Bool -> f Bool) -> ListChannelsRequest -> f ListChannelsRequest

HasField Invoice "isAmp" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "isAmp" -> (Bool -> f Bool) -> Invoice -> f Invoice

HasField Invoice "isKeysend" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "isKeysend" -> (Bool -> f Bool) -> Invoice -> f Invoice

HasField Invoice "private" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "private" -> (Bool -> f Bool) -> Invoice -> f Invoice

HasField Invoice "settled" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "settled" -> (Bool -> f Bool) -> Invoice -> f Invoice

HasField Hop "tlvPayload" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "tlvPayload" -> (Bool -> f Bool) -> Hop -> f Hop

HasField HTLC "incoming" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "incoming" -> (Bool -> f Bool) -> HTLC -> f HTLC

HasField GetRecoveryInfoResponse "recoveryFinished" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "recoveryFinished" -> (Bool -> f Bool) -> GetRecoveryInfoResponse -> f GetRecoveryInfoResponse

HasField GetRecoveryInfoResponse "recoveryMode" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "recoveryMode" -> (Bool -> f Bool) -> GetRecoveryInfoResponse -> f GetRecoveryInfoResponse

HasField GetInfoResponse "syncedToChain" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "syncedToChain" -> (Bool -> f Bool) -> GetInfoResponse -> f GetInfoResponse

HasField GetInfoResponse "syncedToGraph" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "syncedToGraph" -> (Bool -> f Bool) -> GetInfoResponse -> f GetInfoResponse

HasField GetInfoResponse "testnet" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "testnet" -> (Bool -> f Bool) -> GetInfoResponse -> f GetInfoResponse

HasField Feature "isKnown" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "isKnown" -> (Bool -> f Bool) -> Feature -> f Feature

HasField Feature "isRequired" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "isRequired" -> (Bool -> f Bool) -> Feature -> f Feature

HasField EstimateFeeRequest "spendUnconfirmed" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "spendUnconfirmed" -> (Bool -> f Bool) -> EstimateFeeRequest -> f EstimateFeeRequest

HasField EdgeLocator "directionReverse" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "directionReverse" -> (Bool -> f Bool) -> EdgeLocator -> f EdgeLocator

HasField DeleteMacaroonIDResponse "deleted" Bool 
Instance details

Defined in Proto.LndGrpc

HasField DeleteAllPaymentsRequest "failedHtlcsOnly" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "failedHtlcsOnly" -> (Bool -> f Bool) -> DeleteAllPaymentsRequest -> f DeleteAllPaymentsRequest

HasField DeleteAllPaymentsRequest "failedPaymentsOnly" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "failedPaymentsOnly" -> (Bool -> f Bool) -> DeleteAllPaymentsRequest -> f DeleteAllPaymentsRequest

HasField DebugLevelRequest "show" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "show" -> (Bool -> f Bool) -> DebugLevelRequest -> f DebugLevelRequest

HasField ConnectPeerRequest "perm" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "perm" -> (Bool -> f Bool) -> ConnectPeerRequest -> f ConnectPeerRequest

HasField ClosedChannelsRequest "abandoned" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "abandoned" -> (Bool -> f Bool) -> ClosedChannelsRequest -> f ClosedChannelsRequest

HasField ClosedChannelsRequest "breach" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "breach" -> (Bool -> f Bool) -> ClosedChannelsRequest -> f ClosedChannelsRequest

HasField ClosedChannelsRequest "cooperative" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "cooperative" -> (Bool -> f Bool) -> ClosedChannelsRequest -> f ClosedChannelsRequest

HasField ClosedChannelsRequest "fundingCanceled" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "fundingCanceled" -> (Bool -> f Bool) -> ClosedChannelsRequest -> f ClosedChannelsRequest

HasField ClosedChannelsRequest "localForce" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "localForce" -> (Bool -> f Bool) -> ClosedChannelsRequest -> f ClosedChannelsRequest

HasField ClosedChannelsRequest "remoteForce" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "remoteForce" -> (Bool -> f Bool) -> ClosedChannelsRequest -> f ClosedChannelsRequest

HasField CloseChannelRequest "force" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "force" -> (Bool -> f Bool) -> CloseChannelRequest -> f CloseChannelRequest

HasField ChannelGraphRequest "includeUnannounced" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "includeUnannounced" -> (Bool -> f Bool) -> ChannelGraphRequest -> f ChannelGraphRequest

HasField ChannelCloseUpdate "success" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "success" -> (Bool -> f Bool) -> ChannelCloseUpdate -> f ChannelCloseUpdate

HasField ChannelAcceptResponse "accept" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "accept" -> (Bool -> f Bool) -> ChannelAcceptResponse -> f ChannelAcceptResponse

HasField Channel "active" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "active" -> (Bool -> f Bool) -> Channel -> f Channel

HasField Channel "initiator" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "initiator" -> (Bool -> f Bool) -> Channel -> f Channel

HasField Channel "private" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "private" -> (Bool -> f Bool) -> Channel -> f Channel

HasField Channel "staticRemoteKey" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "staticRemoteKey" -> (Bool -> f Bool) -> Channel -> f Channel

HasField AbandonChannelRequest "iKnowWhatIAmDoing" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "iKnowWhatIAmDoing" -> (Bool -> f Bool) -> AbandonChannelRequest -> f AbandonChannelRequest

HasField AbandonChannelRequest "pendingFundingShimOnly" Bool 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "pendingFundingShimOnly" -> (Bool -> f Bool) -> AbandonChannelRequest -> f AbandonChannelRequest

HasField AddHoldInvoiceRequest "private" Bool 
Instance details

Defined in Proto.InvoiceGrpc

Methods

fieldOf :: Functor f => Proxy# "private" -> (Bool -> f Bool) -> AddHoldInvoiceRequest -> f AddHoldInvoiceRequest

HasField TrackPaymentRequest "noInflightUpdates" Bool 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "noInflightUpdates" -> (Bool -> f Bool) -> TrackPaymentRequest -> f TrackPaymentRequest

HasField SendPaymentRequest "allowSelfPayment" Bool 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "allowSelfPayment" -> (Bool -> f Bool) -> SendPaymentRequest -> f SendPaymentRequest

HasField SendPaymentRequest "amp" Bool 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "amp" -> (Bool -> f Bool) -> SendPaymentRequest -> f SendPaymentRequest

HasField SendPaymentRequest "noInflightUpdates" Bool 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "noInflightUpdates" -> (Bool -> f Bool) -> SendPaymentRequest -> f SendPaymentRequest

HasField UnlockWalletRequest "statelessInit" Bool 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

fieldOf :: Functor f => Proxy# "statelessInit" -> (Bool -> f Bool) -> UnlockWalletRequest -> f UnlockWalletRequest

HasField InitWalletRequest "statelessInit" Bool 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

fieldOf :: Functor f => Proxy# "statelessInit" -> (Bool -> f Bool) -> InitWalletRequest -> f InitWalletRequest

HasField ChangePasswordRequest "newMacaroonRootKey" Bool 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

fieldOf :: Functor f => Proxy# "newMacaroonRootKey" -> (Bool -> f Bool) -> ChangePasswordRequest -> f ChangePasswordRequest

HasField ChangePasswordRequest "statelessInit" Bool 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

fieldOf :: Functor f => Proxy# "statelessInit" -> (Bool -> f Bool) -> ChangePasswordRequest -> f ChangePasswordRequest

HasField PolicyUpdateRequest "maybe'global" (Maybe Bool) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'global" -> (Maybe Bool -> f (Maybe Bool)) -> PolicyUpdateRequest -> f PolicyUpdateRequest

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
type DemoteRep Bool 
Instance details

Defined in GHC.Generics

type DemoteRep Bool = Bool
newtype Vector Bool 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector Bool = V_Bool (Vector Word8)
newtype MVector s Bool 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Bool = MV_Bool (MVector s Word8)

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
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] #

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 #

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 #

Lift Char 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Char -> Q Exp #

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 () #

NFData Char 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Char -> () #

ErrorList Char 
Instance details

Defined in Control.Monad.Trans.Error

Methods

listMsg :: String -> [Char] #

FromJSON Char 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Char #

parseJSONList :: Value -> Parser [Char] #

FromJSONKey Char 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction Char

fromJSONKeyList :: FromJSONKeyFunction [Char]

Hashable Char 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Char -> Int #

hash :: Char -> Int

Prim Char 
Instance details

Defined in Data.Primitive.Types

ToJSON Char 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Char -> Value

toEncoding :: Char -> Encoding

toJSONList :: [Char] -> Value

toEncodingList :: [Char] -> Encoding

ToJSONKey Char 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction Char

toJSONKeyList :: ToJSONKeyFunction [Char]

Unbox Char 
Instance details

Defined in Data.Vector.Unboxed.Base

ToLText String 
Instance details

Defined in Universum.String.Conversion

Methods

toLText :: String -> Text #

ToString String 
Instance details

Defined in Universum.String.Conversion

Methods

toString :: String -> String #

ToText String 
Instance details

Defined in Universum.String.Conversion

Methods

toText :: String -> Text #

FoldCase Char 
Instance details

Defined in Data.CaseInsensitive.Internal

Methods

foldCase :: Char -> Char

foldCaseList :: [Char] -> [Char]

PrimType Char 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Char :: Nat

Methods

primSizeInBytes :: Proxy Char -> CountOf Word8

primShiftToBytes :: Proxy Char -> Int

primBaUIndex :: ByteArray# -> Offset Char -> Char

primMbaURead :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Char -> prim Char

primMbaUWrite :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Char -> Char -> prim ()

primAddrIndex :: Addr# -> Offset Char -> Char

primAddrRead :: PrimMonad prim => Addr# -> Offset Char -> prim Char

primAddrWrite :: PrimMonad prim => Addr# -> Offset Char -> Char -> prim ()

PrimMemoryComparable Char 
Instance details

Defined in Basement.PrimType

Subtractive Char 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Char :: Type

Methods

(-) :: Char -> Char -> Difference Char

MVector MVector Char 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s Char -> Int

basicUnsafeSlice :: Int -> Int -> MVector s Char -> MVector s Char

basicOverlaps :: MVector s Char -> MVector s Char -> Bool

basicUnsafeNew :: PrimMonad m => Int -> m (MVector (PrimState m) Char)

basicInitialize :: PrimMonad m => MVector (PrimState m) Char -> m ()

basicUnsafeReplicate :: PrimMonad m => Int -> Char -> m (MVector (PrimState m) Char)

basicUnsafeRead :: PrimMonad m => MVector (PrimState m) Char -> Int -> m Char

basicUnsafeWrite :: PrimMonad m => MVector (PrimState m) Char -> Int -> Char -> m ()

basicClear :: PrimMonad m => MVector (PrimState m) Char -> m ()

basicSet :: PrimMonad m => MVector (PrimState m) Char -> Char -> m ()

basicUnsafeCopy :: PrimMonad m => MVector (PrimState m) Char -> MVector (PrimState m) Char -> m ()

basicUnsafeMove :: PrimMonad m => MVector (PrimState m) Char -> MVector (PrimState m) Char -> m ()

basicUnsafeGrow :: PrimMonad m => MVector (PrimState m) Char -> Int -> m (MVector (PrimState m) Char)

Vector Vector Char 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: PrimMonad m => Mutable Vector (PrimState m) Char -> m (Vector Char)

basicUnsafeThaw :: PrimMonad m => Vector Char -> m (Mutable Vector (PrimState m) Char)

basicLength :: Vector Char -> Int

basicUnsafeSlice :: Int -> Int -> Vector Char -> Vector Char

basicUnsafeIndexM :: Monad m => Vector Char -> Int -> m Char

basicUnsafeCopy :: PrimMonad m => Mutable Vector (PrimState m) Char -> Vector Char -> m ()

elemseq :: Vector Char -> Char -> b -> b

ConvertUtf8 String ByteString 
Instance details

Defined in Universum.String.Conversion

ConvertUtf8 String ByteString 
Instance details

Defined in Universum.String.Conversion

StringConv String String 
Instance details

Defined in Data.String.Conv

Methods

strConv :: Leniency -> String -> String

StringConv String ByteString 
Instance details

Defined in Data.String.Conv

Methods

strConv :: Leniency -> String -> ByteString

StringConv String ByteString 
Instance details

Defined in Data.String.Conv

Methods

strConv :: Leniency -> String -> ByteString

StringConv String Text 
Instance details

Defined in Data.String.Conv

Methods

strConv :: Leniency -> String -> Text

StringConv String Text 
Instance details

Defined in Data.String.Conv

Methods

strConv :: Leniency -> String -> Text

StringConv ByteString String 
Instance details

Defined in Data.String.Conv

Methods

strConv :: Leniency -> ByteString -> String

StringConv ByteString String 
Instance details

Defined in Data.String.Conv

Methods

strConv :: Leniency -> ByteString -> String

StringConv Text String 
Instance details

Defined in Data.String.Conv

Methods

strConv :: Leniency -> Text -> String

StringConv Text String 
Instance details

Defined in Data.String.Conv

Methods

strConv :: Leniency -> Text -> String

Generic1 (URec Char :: k -> Type) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 (URec Char) :: k -> Type #

Methods

from1 :: URec Char a -> Rep1 (URec Char) a #

to1 :: Rep1 (URec Char) a -> URec Char a #

PersistField [Char] 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: [Char] -> PersistValue

fromPersistValue :: PersistValue -> Either Text [Char]

PersistFieldSql [Char] 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy [Char] -> SqlType

Print [Char] 
Instance details

Defined in Universum.Print.Internal

Methods

hPutStr :: Handle -> [Char] -> IO ()

hPutStrLn :: Handle -> [Char] -> IO ()

ToNumeric [Char] 
Instance details

Defined in Codec.QRCode.Data.ToInput

Methods

toNumeric :: [Char] -> [Int]

ToText [Char] 
Instance details

Defined in Codec.QRCode.Data.ToInput

Methods

toString :: [Char] -> [Char]

isCI :: [Char] -> Bool

Functor (URec Char :: Type -> 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 #

Foldable (URec Char :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => URec Char m -> m #

foldMap :: Monoid m => (a -> m) -> URec Char a -> m #

foldr :: (a -> b -> b) -> b -> URec Char a -> b #

foldr' :: (a -> b -> b) -> b -> URec Char a -> b #

foldl :: (b -> a -> b) -> b -> URec Char a -> b #

foldl' :: (b -> a -> b) -> b -> URec Char a -> b #

foldr1 :: (a -> a -> a) -> URec Char a -> a #

foldl1 :: (a -> a -> a) -> URec Char a -> a #

toList :: URec Char a -> [a] #

null :: URec Char a -> Bool #

length :: URec Char a -> Int #

elem :: Eq a => a -> URec Char a -> Bool #

maximum :: Ord a => URec Char a -> a #

minimum :: Ord a => URec Char a -> a #

sum :: Num a => URec Char a -> a #

product :: Num a => URec Char a -> a #

Traversable (URec Char :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> URec Char a -> f (URec Char b) #

sequenceA :: Applicative f => URec Char (f a) -> f (URec Char a) #

mapM :: Monad m => (a -> m b) -> URec Char a -> m (URec Char b) #

sequence :: Monad m => URec Char (m a) -> m (URec Char a) #

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 #

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 #

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 #

newtype Vector Char 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector Char = V_Char (Vector Char)
type NatNumMaxBound Char 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Char = 1114111
type Difference Char 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Char = Int
type PrimSize Char 
Instance details

Defined in Basement.PrimType

type PrimSize Char = 4
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 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.

Constructors

D# Double# 
Instances
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 #

Floating Double

Since: base-2.1

Instance details

Defined in GHC.Float

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

Read Double

Since: base-2.1

Instance details

Defined in GHC.Read

RealFloat Double

Since: base-2.1

Instance details

Defined in GHC.Float

Lift Double 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Double -> Q Exp #

Storable Double

Since: base-2.1

Instance details

Defined in Foreign.Storable

NFData Double 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Double -> () #

FromJSON Double 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Double #

parseJSONList :: Value -> Parser [Double] #

FromJSONKey Double 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction Double

fromJSONKeyList :: FromJSONKeyFunction [Double]

Hashable Double 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Double -> Int #

hash :: Double -> Int

Prim Double 
Instance details

Defined in Data.Primitive.Types

ToJSON Double 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Double -> Value

toEncoding :: Double -> Encoding

toJSONList :: [Double] -> Value

toEncodingList :: [Double] -> Encoding

ToJSONKey Double 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction Double

toJSONKeyList :: ToJSONKeyFunction [Double]

Unbox Double 
Instance details

Defined in Data.Vector.Unboxed.Base

PersistField Double 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Double -> PersistValue

fromPersistValue :: PersistValue -> Either Text Double

PersistFieldSql Double 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Double -> SqlType

FieldDefault Double 
Instance details

Defined in Data.ProtoLens.Message

PrimType Double 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Double :: Nat

Methods

primSizeInBytes :: Proxy Double -> CountOf Word8

primShiftToBytes :: Proxy Double -> Int

primBaUIndex :: ByteArray# -> Offset Double -> Double

primMbaURead :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Double -> prim Double

primMbaUWrite :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Double -> Double -> prim ()

primAddrIndex :: Addr# -> Offset Double -> Double

primAddrRead :: PrimMonad prim => Addr# -> Offset Double -> prim Double

primAddrWrite :: PrimMonad prim => Addr# -> Offset Double -> Double -> prim ()

Subtractive Double 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Double :: Type

Methods

(-) :: Double -> Double -> Difference Double

MVector MVector Double 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s Double -> Int

basicUnsafeSlice :: Int -> Int -> MVector s Double -> MVector s Double

basicOverlaps :: MVector s Double -> MVector s Double -> Bool

basicUnsafeNew :: PrimMonad m => Int -> m (MVector (PrimState m) Double)

basicInitialize :: PrimMonad m => MVector (PrimState m) Double -> m ()

basicUnsafeReplicate :: PrimMonad m => Int -> Double -> m (MVector (PrimState m) Double)

basicUnsafeRead :: PrimMonad m => MVector (PrimState m) Double -> Int -> m Double

basicUnsafeWrite :: PrimMonad m => MVector (PrimState m) Double -> Int -> Double -> m ()

basicClear :: PrimMonad m => MVector (PrimState m) Double -> m ()

basicSet :: PrimMonad m => MVector (PrimState m) Double -> Double -> m ()

basicUnsafeCopy :: PrimMonad m => MVector (PrimState m) Double -> MVector (PrimState m) Double -> m ()

basicUnsafeMove :: PrimMonad m => MVector (PrimState m) Double -> MVector (PrimState m) Double -> m ()

basicUnsafeGrow :: PrimMonad m => MVector (PrimState m) Double -> Int -> m (MVector (PrimState m) Double)

Vector Vector Double 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: PrimMonad m => Mutable Vector (PrimState m) Double -> m (Vector Double)

basicUnsafeThaw :: PrimMonad m => Vector Double -> m (Mutable Vector (PrimState m) Double)

basicLength :: Vector Double -> Int

basicUnsafeSlice :: Int -> Int -> Vector Double -> Vector Double

basicUnsafeIndexM :: Monad m => Vector Double -> Int -> m Double

basicUnsafeCopy :: PrimMonad m => Mutable Vector (PrimState m) Double -> Vector Double -> m ()

elemseq :: Vector Double -> Double -> b -> b

HasField QueryRoutesResponse "successProb" Double 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "successProb" -> (Double -> f Double) -> QueryRoutesResponse -> f QueryRoutesResponse

HasField PolicyUpdateRequest "feeRate" Double 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "feeRate" -> (Double -> f Double) -> PolicyUpdateRequest -> f PolicyUpdateRequest

HasField NetworkInfo "avgChannelSize" Double 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "avgChannelSize" -> (Double -> f Double) -> NetworkInfo -> f NetworkInfo

HasField NetworkInfo "avgOutDegree" Double 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "avgOutDegree" -> (Double -> f Double) -> NetworkInfo -> f NetworkInfo

HasField GetRecoveryInfoResponse "progress" Double 
Instance details

Defined in Proto.LndGrpc

HasField FloatMetric "normalizedValue" Double 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "normalizedValue" -> (Double -> f Double) -> FloatMetric -> f FloatMetric

HasField FloatMetric "value" Double 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "value" -> (Double -> f Double) -> FloatMetric -> f FloatMetric

HasField ChannelFeeReport "feeRate" Double 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "feeRate" -> (Double -> f Double) -> ChannelFeeReport -> f ChannelFeeReport

HasField QueryProbabilityResponse "probability" Double 
Instance details

Defined in Proto.RouterGrpc

Generic1 (URec Double :: k -> Type) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 (URec Double) :: k -> Type #

Methods

from1 :: URec Double a -> Rep1 (URec Double) a #

to1 :: Rep1 (URec Double) a -> URec Double a #

Functor (URec Double :: Type -> 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 #

Foldable (URec Double :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => URec Double m -> m #

foldMap :: Monoid m => (a -> m) -> URec Double a -> m #

foldr :: (a -> b -> b) -> b -> URec Double a -> b #

foldr' :: (a -> b -> b) -> b -> URec Double a -> b #

foldl :: (b -> a -> b) -> b -> URec Double a -> b #

foldl' :: (b -> a -> b) -> b -> URec Double a -> b #

foldr1 :: (a -> a -> a) -> URec Double a -> a #

foldl1 :: (a -> a -> a) -> URec Double a -> a #

toList :: URec Double a -> [a] #

null :: URec Double a -> Bool #

length :: URec Double a -> Int #

elem :: Eq a => a -> URec Double a -> Bool #

maximum :: Ord a => URec Double a -> a #

minimum :: Ord a => URec Double a -> a #

sum :: Num a => URec Double a -> a #

product :: Num a => URec Double a -> a #

Traversable (URec Double :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> URec Double a -> f (URec Double b) #

sequenceA :: Applicative f => URec Double (f a) -> f (URec Double a) #

mapM :: Monad m => (a -> m b) -> URec Double a -> m (URec Double b) #

sequence :: Monad m => URec Double (m a) -> m (URec Double a) #

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 #

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 #

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 #

newtype Vector Double 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector Double = V_Double (Vector Double)
type Difference Double 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Double = Double
type PrimSize Double 
Instance details

Defined in Basement.PrimType

type PrimSize Double = 8
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

newtype MVector s Double = MV_Double (MVector s Double)
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.

Constructors

F# Float# 
Instances
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 substitutivity:

>>> 0 == (-0 :: Float)
True
>>> recip 0 == recip (-0 :: Float)
False
Instance details

Defined in GHC.Classes

Methods

(==) :: Float -> Float -> Bool #

(/=) :: Float -> Float -> Bool #

Floating Float

Since: base-2.1

Instance details

Defined in GHC.Float

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 #

Read Float

Since: base-2.1

Instance details

Defined in GHC.Read

RealFloat Float

Since: base-2.1

Instance details

Defined in GHC.Float

Lift Float 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Float -> Q Exp #

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 () #

NFData Float 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Float -> () #

FromJSON Float 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Float #

parseJSONList :: Value -> Parser [Float] #

FromJSONKey Float 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction Float

fromJSONKeyList :: FromJSONKeyFunction [Float]

Hashable Float 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Float -> Int #

hash :: Float -> Int

Prim Float 
Instance details

Defined in Data.Primitive.Types

ToJSON Float 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Float -> Value

toEncoding :: Float -> Encoding

toJSONList :: [Float] -> Value

toEncodingList :: [Float] -> Encoding

ToJSONKey Float 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction Float

toJSONKeyList :: ToJSONKeyFunction [Float]

Unbox Float 
Instance details

Defined in Data.Vector.Unboxed.Base

FieldDefault Float 
Instance details

Defined in Data.ProtoLens.Message

TiffSaveable PixelF 
Instance details

Defined in Codec.Picture.Tiff

Methods

colorSpaceOfPixel :: PixelF -> TiffColorspace

extraSampleCodeOfPixel :: PixelF -> Maybe ExtraSample

subSamplingInfo :: PixelF -> Vector Word32

sampleFormat :: PixelF -> [TiffSampleFormat]

Pixel PixelF 
Instance details

Defined in Codec.Picture.Types

Associated Types

type PixelBaseComponent PixelF :: Type

Methods

mixWith :: (Int -> PixelBaseComponent PixelF -> PixelBaseComponent PixelF -> PixelBaseComponent PixelF) -> PixelF -> PixelF -> PixelF

mixWithAlpha :: (Int -> PixelBaseComponent PixelF -> PixelBaseComponent PixelF -> PixelBaseComponent PixelF) -> (PixelBaseComponent PixelF -> PixelBaseComponent PixelF -> PixelBaseComponent PixelF) -> PixelF -> PixelF -> PixelF

pixelOpacity :: PixelF -> PixelBaseComponent PixelF

componentCount :: PixelF -> Int

colorMap :: (PixelBaseComponent PixelF -> PixelBaseComponent PixelF) -> PixelF -> PixelF

pixelBaseIndex :: Image PixelF -> Int -> Int -> Int

mutablePixelBaseIndex :: MutableImage s PixelF -> Int -> Int -> Int

pixelAt :: Image PixelF -> Int -> Int -> PixelF

readPixel :: PrimMonad m => MutableImage (PrimState m) PixelF -> Int -> Int -> m PixelF

writePixel :: PrimMonad m => MutableImage (PrimState m) PixelF -> Int -> Int -> PixelF -> m ()

unsafePixelAt :: Vector (PixelBaseComponent PixelF) -> Int -> PixelF

unsafeReadPixel :: PrimMonad m => STVector (PrimState m) (PixelBaseComponent PixelF) -> Int -> m PixelF

unsafeWritePixel :: PrimMonad m => STVector (PrimState m) (PixelBaseComponent PixelF) -> Int -> PixelF -> m ()

Unpackable Float 
Instance details

Defined in Codec.Picture.Tiff

Associated Types

type StorageType Float :: Type

Methods

outAlloc :: Float -> Int -> ST s (STVector s (StorageType Float))

allocTempBuffer :: Float -> STVector s (StorageType Float) -> Int -> ST s (STVector s Word8)

offsetStride :: Float -> Int -> Int -> (Int, Int)

mergeBackTempBuffer :: Float -> Endianness -> STVector s Word8 -> Int -> Int -> Word32 -> Int -> STVector s (StorageType Float) -> ST s ()

LumaPlaneExtractable PixelF 
Instance details

Defined in Codec.Picture.Types

Methods

computeLuma :: PixelF -> PixelBaseComponent PixelF

extractLumaPlane :: Image PixelF -> Image (PixelBaseComponent PixelF)

PackeablePixel PixelF 
Instance details

Defined in Codec.Picture.Types

Associated Types

type PackedRepresentation PixelF :: Type

Methods

packPixel :: PixelF -> PackedRepresentation PixelF

unpackPixel :: PackedRepresentation PixelF -> PixelF

PrimType Float 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Float :: Nat

Methods

primSizeInBytes :: Proxy Float -> CountOf Word8

primShiftToBytes :: Proxy Float -> Int

primBaUIndex :: ByteArray# -> Offset Float -> Float

primMbaURead :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Float -> prim Float

primMbaUWrite :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Float -> Float -> prim ()

primAddrIndex :: Addr# -> Offset Float -> Float

primAddrRead :: PrimMonad prim => Addr# -> Offset Float -> prim Float

primAddrWrite :: PrimMonad prim => Addr# -> Offset Float -> Float -> prim ()

Subtractive Float 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Float :: Type

Methods

(-) :: Float -> Float -> Difference Float

MVector MVector Float 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s Float -> Int

basicUnsafeSlice :: Int -> Int -> MVector s Float -> MVector s Float

basicOverlaps :: MVector s Float -> MVector s Float -> Bool

basicUnsafeNew :: PrimMonad m => Int -> m (MVector (PrimState m) Float)

basicInitialize :: PrimMonad m => MVector (PrimState m) Float -> m ()

basicUnsafeReplicate :: PrimMonad m => Int -> Float -> m (MVector (PrimState m) Float)

basicUnsafeRead :: PrimMonad m => MVector (PrimState m) Float -> Int -> m Float

basicUnsafeWrite :: PrimMonad m => MVector (PrimState m) Float -> Int -> Float -> m ()

basicClear :: PrimMonad m => MVector (PrimState m) Float -> m ()

basicSet :: PrimMonad m => MVector (PrimState m) Float -> Float -> m ()

basicUnsafeCopy :: PrimMonad m => MVector (PrimState m) Float -> MVector (PrimState m) Float -> m ()

basicUnsafeMove :: PrimMonad m => MVector (PrimState m) Float -> MVector (PrimState m) Float -> m ()

basicUnsafeGrow :: PrimMonad m => MVector (PrimState m) Float -> Int -> m (MVector (PrimState m) Float)

Vector Vector Float 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: PrimMonad m => Mutable Vector (PrimState m) Float -> m (Vector Float)

basicUnsafeThaw :: PrimMonad m => Vector Float -> m (Mutable Vector (PrimState m) Float)

basicLength :: Vector Float -> Int

basicUnsafeSlice :: Int -> Int -> Vector Float -> Vector Float

basicUnsafeIndexM :: Monad m => Vector Float -> Int -> m Float

basicUnsafeCopy :: PrimMonad m => Mutable Vector (PrimState m) Float -> Vector Float -> m ()

elemseq :: Vector Float -> Float -> b -> b

Decimable PixelF Pixel16 
Instance details

Defined in Codec.Picture

Methods

decimateBitDepth :: Image PixelF -> Image Pixel16

Decimable PixelF Pixel8 
Instance details

Defined in Codec.Picture

Methods

decimateBitDepth :: Image PixelF -> Image Pixel8

ColorConvertible Pixel8 PixelF 
Instance details

Defined in Codec.Picture.Types

Methods

promotePixel :: Pixel8 -> PixelF

promoteImage :: Image Pixel8 -> Image PixelF

ColorConvertible PixelF PixelRGBF 
Instance details

Defined in Codec.Picture.Types

Methods

promotePixel :: PixelF -> PixelRGBF

promoteImage :: Image PixelF -> Image PixelRGBF

HasField MissionControlConfig "hopProbability" Float 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "hopProbability" -> (Float -> f Float) -> MissionControlConfig -> f MissionControlConfig

HasField MissionControlConfig "weight" Float 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "weight" -> (Float -> f Float) -> MissionControlConfig -> f MissionControlConfig

Generic1 (URec Float :: k -> Type) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 (URec Float) :: k -> Type #

Methods

from1 :: URec Float a -> Rep1 (URec Float) a #

to1 :: Rep1 (URec Float) a -> URec Float a #

Functor (URec Float :: Type -> 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 #

Foldable (URec Float :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => URec Float m -> m #

foldMap :: Monoid m => (a -> m) -> URec Float a -> m #

foldr :: (a -> b -> b) -> b -> URec Float a -> b #

foldr' :: (a -> b -> b) -> b -> URec Float a -> b #

foldl :: (b -> a -> b) -> b -> URec Float a -> b #

foldl' :: (b -> a -> b) -> b -> URec Float a -> b #

foldr1 :: (a -> a -> a) -> URec Float a -> a #

foldl1 :: (a -> a -> a) -> URec Float a -> a #

toList :: URec Float a -> [a] #

null :: URec Float a -> Bool #

length :: URec Float a -> Int #

elem :: Eq a => a -> URec Float a -> Bool #

maximum :: Ord a => URec Float a -> a #

minimum :: Ord a => URec Float a -> a #

sum :: Num a => URec Float a -> a #

product :: Num a => URec Float a -> a #

Traversable (URec Float :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> URec Float a -> f (URec Float b) #

sequenceA :: Applicative f => URec Float (f a) -> f (URec Float a) #

mapM :: Monad m => (a -> m b) -> URec Float a -> m (URec Float b) #

sequence :: Monad m => URec Float (m a) -> m (URec Float a) #

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 #

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 #

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 #

newtype Vector Float 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector Float = V_Float (Vector Float)
type PixelBaseComponent PixelF 
Instance details

Defined in Codec.Picture.Types

type PixelBaseComponent PixelF = Float
type StorageType Float 
Instance details

Defined in Codec.Picture.Tiff

type StorageType Float = Float
type PackedRepresentation PixelF 
Instance details

Defined in Codec.Picture.Types

type PackedRepresentation PixelF = PixelF
type Difference Float 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Float = Float
type PrimSize Float 
Instance details

Defined in Basement.PrimType

type PrimSize Float = 4
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

newtype MVector s Float = MV_Float (MVector s Float)
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
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] #

Eq Int 
Instance details

Defined in GHC.Classes

Methods

(==) :: Int -> Int -> Bool #

(/=) :: Int -> Int -> Bool #

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 #

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 #

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 #

Read Int

Since: base-2.1

Instance details

Defined in GHC.Read

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 #

Lift Int 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Int -> Q Exp #

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 () #

Bits Int

Since: base-2.1

Instance details

Defined in Data.Bits

Methods

(.&.) :: Int -> Int -> Int #

(.|.) :: Int -> Int -> Int #

xor :: Int -> Int -> Int #

complement :: Int -> Int #

shift :: Int -> Int -> Int #

rotate :: Int -> Int -> Int #

zeroBits :: Int #

bit :: Int -> Int #

setBit :: Int -> Int -> Int #

clearBit :: Int -> Int -> Int #

complementBit :: Int -> Int -> Int #

testBit :: Int -> Int -> Bool #

bitSizeMaybe :: Int -> Maybe Int #

bitSize :: Int -> Int #

isSigned :: Int -> Bool #

shiftL :: Int -> Int -> Int #

unsafeShiftL :: Int -> Int -> Int #

shiftR :: Int -> Int -> Int #

unsafeShiftR :: Int -> Int -> Int #

rotateL :: Int -> Int -> Int #

rotateR :: Int -> Int -> Int #

popCount :: Int -> Int #

FiniteBits Int

Since: base-4.6.0.0

Instance details

Defined in Data.Bits

NFData Int 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int -> () #

FromJSON Int 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Int #

parseJSONList :: Value -> Parser [Int] #

FromJSONKey Int 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction Int

fromJSONKeyList :: FromJSONKeyFunction [Int]

Hashable Int 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int -> Int #

hash :: Int -> Int

Prim Int 
Instance details

Defined in Data.Primitive.Types

ToJSON Int 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Int -> Value

toEncoding :: Int -> Encoding

toJSONList :: [Int] -> Value

toEncodingList :: [Int] -> Encoding

ToJSONKey Int 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction Int

toJSONKeyList :: ToJSONKeyFunction [Int]

Unbox Int 
Instance details

Defined in Data.Vector.Unboxed.Base

PersistField Int 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Int -> PersistValue

fromPersistValue :: PersistValue -> Either Text Int

PersistFieldSql Int 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Int -> SqlType

ByteSource Int 
Instance details

Defined in Data.UUID.Types.Internal.Builder

Methods

(/-/) :: ByteSink Int g -> Int -> g

PrimType Int 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Int :: Nat

Methods

primSizeInBytes :: Proxy Int -> CountOf Word8

primShiftToBytes :: Proxy Int -> Int

primBaUIndex :: ByteArray# -> Offset Int -> Int

primMbaURead :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Int -> prim Int

primMbaUWrite :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Int -> Int -> prim ()

primAddrIndex :: Addr# -> Offset Int -> Int

primAddrRead :: PrimMonad prim => Addr# -> Offset Int -> prim Int

primAddrWrite :: PrimMonad prim => Addr# -> Offset Int -> Int -> prim ()

PrimMemoryComparable Int 
Instance details

Defined in Basement.PrimType

Subtractive Int 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Int :: Type

Methods

(-) :: Int -> Int -> Difference Int

MVector MVector Int 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s Int -> Int

basicUnsafeSlice :: Int -> Int -> MVector s Int -> MVector s Int

basicOverlaps :: MVector s Int -> MVector s Int -> Bool

basicUnsafeNew :: PrimMonad m => Int -> m (MVector (PrimState m) Int)

basicInitialize :: PrimMonad m => MVector (PrimState m) Int -> m ()

basicUnsafeReplicate :: PrimMonad m => Int -> Int -> m (MVector (PrimState m) Int)

basicUnsafeRead :: PrimMonad m => MVector (PrimState m) Int -> Int -> m Int

basicUnsafeWrite :: PrimMonad m => MVector (PrimState m) Int -> Int -> Int -> m ()

basicClear :: PrimMonad m => MVector (PrimState m) Int -> m ()

basicSet :: PrimMonad m => MVector (PrimState m) Int -> Int -> m ()

basicUnsafeCopy :: PrimMonad m => MVector (PrimState m) Int -> MVector (PrimState m) Int -> m ()

basicUnsafeMove :: PrimMonad m => MVector (PrimState m) Int -> MVector (PrimState m) Int -> m ()

basicUnsafeGrow :: PrimMonad m => MVector (PrimState m) Int -> Int -> m (MVector (PrimState m) Int)

Torsor Date Int 
Instance details

Defined in Chronos

Methods

add :: Int -> Date -> Date

difference :: Date -> Date -> Int

Torsor Day Int 
Instance details

Defined in Chronos

Methods

add :: Int -> Day -> Day

difference :: Day -> Day -> Int

Torsor Offset Int 
Instance details

Defined in Chronos

Methods

add :: Int -> Offset -> Offset

difference :: Offset -> Offset -> Int

Torsor OrdinalDate Int 
Instance details

Defined in Chronos

Methods

add :: Int -> OrdinalDate -> OrdinalDate

difference :: OrdinalDate -> OrdinalDate -> Int

Vector Vector Int 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: PrimMonad m => Mutable Vector (PrimState m) Int -> m (Vector Int)

basicUnsafeThaw :: PrimMonad m => Vector Int -> m (Mutable Vector (PrimState m) Int)

basicLength :: Vector Int -> Int

basicUnsafeSlice :: Int -> Int -> Vector Int -> Vector Int

basicUnsafeIndexM :: Monad m => Vector Int -> Int -> m Int

basicUnsafeCopy :: PrimMonad m => Mutable Vector (PrimState m) Int -> Vector Int -> m ()

elemseq :: Vector Int -> Int -> b -> b

Generic1 (URec Int :: k -> Type) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 (URec Int) :: k -> Type #

Methods

from1 :: URec Int a -> Rep1 (URec Int) a #

to1 :: Rep1 (URec Int) a -> URec Int a #

ToNumeric [Int] 
Instance details

Defined in Codec.QRCode.Data.ToInput

Methods

toNumeric :: [Int] -> [Int]

Functor (URec Int :: Type -> 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 #

Foldable (URec Int :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => URec Int m -> m #

foldMap :: Monoid m => (a -> m) -> URec Int a -> m #

foldr :: (a -> b -> b) -> b -> URec Int a -> b #

foldr' :: (a -> b -> b) -> b -> URec Int a -> b #

foldl :: (b -> a -> b) -> b -> URec Int a -> b #

foldl' :: (b -> a -> b) -> b -> URec Int a -> b #

foldr1 :: (a -> a -> a) -> URec Int a -> a #

foldl1 :: (a -> a -> a) -> URec Int a -> a #

toList :: URec Int a -> [a] #

null :: URec Int a -> Bool #

length :: URec Int a -> Int #

elem :: Eq a => a -> URec Int a -> Bool #

maximum :: Ord a => URec Int a -> a #

minimum :: Ord a => URec Int a -> a #

sum :: Num a => URec Int a -> a #

product :: Num a => URec Int a -> a #

Traversable (URec Int :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> URec Int a -> f (URec Int b) #

sequenceA :: Applicative f => URec Int (f a) -> f (URec Int a) #

mapM :: Monad m => (a -> m b) -> URec Int a -> m (URec Int b) #

sequence :: Monad m => URec Int (m a) -> m (URec Int a) #

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 #

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 #

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 #

newtype Vector Int 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector Int = V_Int (Vector Int)
type NatNumMaxBound Int 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Int = NatNumMaxBound Int64
type Difference Int 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Int = Int
type PrimSize Int 
Instance details

Defined in Basement.PrimType

type PrimSize Int = 8
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 {}
newtype MVector s Int 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Int = MV_Int (MVector s Int)
type ByteSink Int g 
Instance details

Defined in Data.UUID.Types.Internal.Builder

type ByteSink Int g = Takes4Bytes g
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
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] #

Eq Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

(==) :: Int8 -> Int8 -> Bool #

(/=) :: Int8 -> Int8 -> Bool #

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 #

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 #

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 #

Read Int8

Since: base-2.1

Instance details

Defined in GHC.Int

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 #

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

Lift Int8 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Int8 -> Q Exp #

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

NFData Int8 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int8 -> () #

FromJSON Int8 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Int8 #

parseJSONList :: Value -> Parser [Int8] #

FromJSONKey Int8 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction Int8

fromJSONKeyList :: FromJSONKeyFunction [Int8]

Hashable Int8 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int8 -> Int #

hash :: Int8 -> Int

Prim Int8 
Instance details

Defined in Data.Primitive.Types

ToJSON Int8 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Int8 -> Value

toEncoding :: Int8 -> Encoding

toJSONList :: [Int8] -> Value

toEncodingList :: [Int8] -> Encoding

ToJSONKey Int8 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction Int8

toJSONKeyList :: ToJSONKeyFunction [Int8]

Unbox Int8 
Instance details

Defined in Data.Vector.Unboxed.Base

PersistField Int8 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Int8 -> PersistValue

fromPersistValue :: PersistValue -> Either Text Int8

PersistFieldSql Int8 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Int8 -> SqlType

PrimType Int8 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Int8 :: Nat

Methods

primSizeInBytes :: Proxy Int8 -> CountOf Word8

primShiftToBytes :: Proxy Int8 -> Int

primBaUIndex :: ByteArray# -> Offset Int8 -> Int8

primMbaURead :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Int8 -> prim Int8

primMbaUWrite :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Int8 -> Int8 -> prim ()

primAddrIndex :: Addr# -> Offset Int8 -> Int8

primAddrRead :: PrimMonad prim => Addr# -> Offset Int8 -> prim Int8

primAddrWrite :: PrimMonad prim => Addr# -> Offset Int8 -> Int8 -> prim ()

PrimMemoryComparable Int8 
Instance details

Defined in Basement.PrimType

Subtractive Int8 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Int8 :: Type

Methods

(-) :: Int8 -> Int8 -> Difference Int8

MVector MVector Int8 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s Int8 -> Int

basicUnsafeSlice :: Int -> Int -> MVector s Int8 -> MVector s Int8

basicOverlaps :: MVector s Int8 -> MVector s Int8 -> Bool

basicUnsafeNew :: PrimMonad m => Int -> m (MVector (PrimState m) Int8)

basicInitialize :: PrimMonad m => MVector (PrimState m) Int8 -> m ()

basicUnsafeReplicate :: PrimMonad m => Int -> Int8 -> m (MVector (PrimState m) Int8)

basicUnsafeRead :: PrimMonad m => MVector (PrimState m) Int8 -> Int -> m Int8

basicUnsafeWrite :: PrimMonad m => MVector (PrimState m) Int8 -> Int -> Int8 -> m ()

basicClear :: PrimMonad m => MVector (PrimState m) Int8 -> m ()

basicSet :: PrimMonad m => MVector (PrimState m) Int8 -> Int8 -> m ()

basicUnsafeCopy :: PrimMonad m => MVector (PrimState m) Int8 -> MVector (PrimState m) Int8 -> m ()

basicUnsafeMove :: PrimMonad m => MVector (PrimState m) Int8 -> MVector (PrimState m) Int8 -> m ()

basicUnsafeGrow :: PrimMonad m => MVector (PrimState m) Int8 -> Int -> m (MVector (PrimState m) Int8)

Vector Vector Int8 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: PrimMonad m => Mutable Vector (PrimState m) Int8 -> m (Vector Int8)

basicUnsafeThaw :: PrimMonad m => Vector Int8 -> m (Mutable Vector (PrimState m) Int8)

basicLength :: Vector Int8 -> Int

basicUnsafeSlice :: Int -> Int -> Vector Int8 -> Vector Int8

basicUnsafeIndexM :: Monad m => Vector Int8 -> Int -> m Int8

basicUnsafeCopy :: PrimMonad m => Mutable Vector (PrimState m) Int8 -> Vector Int8 -> m ()

elemseq :: Vector Int8 -> Int8 -> b -> b

newtype Vector Int8 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector Int8 = V_Int8 (Vector Int8)
type NatNumMaxBound Int8 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Int8 = 127
type Difference Int8 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Int8 = Int8
type PrimSize Int8 
Instance details

Defined in Basement.PrimType

type PrimSize Int8 = 1
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
Bounded Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Enum Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Eq Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

(==) :: Int16 -> Int16 -> Bool #

(/=) :: Int16 -> Int16 -> Bool #

Integral Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Num Int16

Since: base-2.1

Instance details

Defined in GHC.Int

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 #

Read 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 #

Ix Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Lift Int16 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Int16 -> Q Exp #

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

NFData Int16 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int16 -> () #

FromJSON Int16 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Int16 #

parseJSONList :: Value -> Parser [Int16] #

FromJSONKey Int16 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction Int16

fromJSONKeyList :: FromJSONKeyFunction [Int16]

Hashable Int16 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int16 -> Int #

hash :: Int16 -> Int

Prim Int16 
Instance details

Defined in Data.Primitive.Types

ToJSON Int16 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Int16 -> Value

toEncoding :: Int16 -> Encoding

toJSONList :: [Int16] -> Value

toEncodingList :: [Int16] -> Encoding

ToJSONKey Int16 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction Int16

toJSONKeyList :: ToJSONKeyFunction [Int16]

Unbox Int16 
Instance details

Defined in Data.Vector.Unboxed.Base

PersistField Int16 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Int16 -> PersistValue

fromPersistValue :: PersistValue -> Either Text Int16

PersistFieldSql Int16 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Int16 -> SqlType

PrimType Int16 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Int16 :: Nat

Methods

primSizeInBytes :: Proxy Int16 -> CountOf Word8

primShiftToBytes :: Proxy Int16 -> Int

primBaUIndex :: ByteArray# -> Offset Int16 -> Int16

primMbaURead :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Int16 -> prim Int16

primMbaUWrite :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Int16 -> Int16 -> prim ()

primAddrIndex :: Addr# -> Offset Int16 -> Int16

primAddrRead :: PrimMonad prim => Addr# -> Offset Int16 -> prim Int16

primAddrWrite :: PrimMonad prim => Addr# -> Offset Int16 -> Int16 -> prim ()

PrimMemoryComparable Int16 
Instance details

Defined in Basement.PrimType

Subtractive Int16 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Int16 :: Type

Methods

(-) :: Int16 -> Int16 -> Difference Int16

MVector MVector Int16 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s Int16 -> Int

basicUnsafeSlice :: Int -> Int -> MVector s Int16 -> MVector s Int16

basicOverlaps :: MVector s Int16 -> MVector s Int16 -> Bool

basicUnsafeNew :: PrimMonad m => Int -> m (MVector (PrimState m) Int16)

basicInitialize :: PrimMonad m => MVector (PrimState m) Int16 -> m ()

basicUnsafeReplicate :: PrimMonad m => Int -> Int16 -> m (MVector (PrimState m) Int16)

basicUnsafeRead :: PrimMonad m => MVector (PrimState m) Int16 -> Int -> m Int16

basicUnsafeWrite :: PrimMonad m => MVector (PrimState m) Int16 -> Int -> Int16 -> m ()

basicClear :: PrimMonad m => MVector (PrimState m) Int16 -> m ()

basicSet :: PrimMonad m => MVector (PrimState m) Int16 -> Int16 -> m ()

basicUnsafeCopy :: PrimMonad m => MVector (PrimState m) Int16 -> MVector (PrimState m) Int16 -> m ()

basicUnsafeMove :: PrimMonad m => MVector (PrimState m) Int16 -> MVector (PrimState m) Int16 -> m ()

basicUnsafeGrow :: PrimMonad m => MVector (PrimState m) Int16 -> Int -> m (MVector (PrimState m) Int16)

Vector Vector Int16 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: PrimMonad m => Mutable Vector (PrimState m) Int16 -> m (Vector Int16)

basicUnsafeThaw :: PrimMonad m => Vector Int16 -> m (Mutable Vector (PrimState m) Int16)

basicLength :: Vector Int16 -> Int

basicUnsafeSlice :: Int -> Int -> Vector Int16 -> Vector Int16

basicUnsafeIndexM :: Monad m => Vector Int16 -> Int -> m Int16

basicUnsafeCopy :: PrimMonad m => Mutable Vector (PrimState m) Int16 -> Vector Int16 -> m ()

elemseq :: Vector Int16 -> Int16 -> b -> b

newtype Vector Int16 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector Int16 = V_Int16 (Vector Int16)
type NatNumMaxBound Int16 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Int16 = 32767
type Difference Int16 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Int16 = Int16
type PrimSize Int16 
Instance details

Defined in Basement.PrimType

type PrimSize Int16 = 2
newtype MVector s Int16 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Int16 = MV_Int16 (MVector s Int16)

data Int32 #

32-bit signed integer type

Instances
Bounded Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Enum Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Eq Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

(==) :: Int32 -> Int32 -> Bool #

(/=) :: Int32 -> Int32 -> Bool #

Integral Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Num Int32

Since: base-2.1

Instance details

Defined in GHC.Int

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 #

Read 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 #

Ix Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Lift Int32 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Int32 -> Q Exp #

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

NFData Int32 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int32 -> () #

FromJSON Int32 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Int32 #

parseJSONList :: Value -> Parser [Int32] #

FromJSONKey Int32 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction Int32

fromJSONKeyList :: FromJSONKeyFunction [Int32]

Hashable Int32 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int32 -> Int #

hash :: Int32 -> Int

Prim Int32 
Instance details

Defined in Data.Primitive.Types

ToJSON Int32 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Int32 -> Value

toEncoding :: Int32 -> Encoding

toJSONList :: [Int32] -> Value

toEncodingList :: [Int32] -> Encoding

ToJSONKey Int32 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction Int32

toJSONKeyList :: ToJSONKeyFunction [Int32]

Unbox Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

PersistField Int32 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Int32 -> PersistValue

fromPersistValue :: PersistValue -> Either Text Int32

PersistFieldSql Int32 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Int32 -> SqlType

FieldDefault Int32 
Instance details

Defined in Data.ProtoLens.Message

PrimType Int32 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Int32 :: Nat

Methods

primSizeInBytes :: Proxy Int32 -> CountOf Word8

primShiftToBytes :: Proxy Int32 -> Int

primBaUIndex :: ByteArray# -> Offset Int32 -> Int32

primMbaURead :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Int32 -> prim Int32

primMbaUWrite :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Int32 -> Int32 -> prim ()

primAddrIndex :: Addr# -> Offset Int32 -> Int32

primAddrRead :: PrimMonad prim => Addr# -> Offset Int32 -> prim Int32

primAddrWrite :: PrimMonad prim => Addr# -> Offset Int32 -> Int32 -> prim ()

PrimMemoryComparable Int32 
Instance details

Defined in Basement.PrimType

Subtractive Int32 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Int32 :: Type

Methods

(-) :: Int32 -> Int32 -> Difference Int32

MVector MVector Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s Int32 -> Int

basicUnsafeSlice :: Int -> Int -> MVector s Int32 -> MVector s Int32

basicOverlaps :: MVector s Int32 -> MVector s Int32 -> Bool

basicUnsafeNew :: PrimMonad m => Int -> m (MVector (PrimState m) Int32)

basicInitialize :: PrimMonad m => MVector (PrimState m) Int32 -> m ()

basicUnsafeReplicate :: PrimMonad m => Int -> Int32 -> m (MVector (PrimState m) Int32)

basicUnsafeRead :: PrimMonad m => MVector (PrimState m) Int32 -> Int -> m Int32

basicUnsafeWrite :: PrimMonad m => MVector (PrimState m) Int32 -> Int -> Int32 -> m ()

basicClear :: PrimMonad m => MVector (PrimState m) Int32 -> m ()

basicSet :: PrimMonad m => MVector (PrimState m) Int32 -> Int32 -> m ()

basicUnsafeCopy :: PrimMonad m => MVector (PrimState m) Int32 -> MVector (PrimState m) Int32 -> m ()

basicUnsafeMove :: PrimMonad m => MVector (PrimState m) Int32 -> MVector (PrimState m) Int32 -> m ()

basicUnsafeGrow :: PrimMonad m => MVector (PrimState m) Int32 -> Int -> m (MVector (PrimState m) Int32)

Vector Vector Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: PrimMonad m => Mutable Vector (PrimState m) Int32 -> m (Vector Int32)

basicUnsafeThaw :: PrimMonad m => Vector Int32 -> m (Mutable Vector (PrimState m) Int32)

basicLength :: Vector Int32 -> Int

basicUnsafeSlice :: Int -> Int -> Vector Int32 -> Vector Int32

basicUnsafeIndexM :: Monad m => Vector Int32 -> Int -> m Int32

basicUnsafeCopy :: PrimMonad m => Mutable Vector (PrimState m) Int32 -> Vector Int32 -> m ()

elemseq :: Vector Int32 -> Int32 -> b -> b

HasField Transaction "blockHeight" Int32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "blockHeight" -> (Int32 -> f Int32) -> Transaction -> f Transaction

HasField Transaction "numConfirmations" Int32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "numConfirmations" -> (Int32 -> f Int32) -> Transaction -> f Transaction

HasField SendRequest "finalCltvDelta" Int32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "finalCltvDelta" -> (Int32 -> f Int32) -> SendRequest -> f SendRequest

HasField SendManyRequest "minConfs" Int32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "minConfs" -> (Int32 -> f Int32) -> SendManyRequest -> f SendManyRequest

HasField SendManyRequest "targetConf" Int32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "targetConf" -> (Int32 -> f Int32) -> SendManyRequest -> f SendManyRequest

HasField SendCoinsRequest "minConfs" Int32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "minConfs" -> (Int32 -> f Int32) -> SendCoinsRequest -> f SendCoinsRequest

HasField SendCoinsRequest "targetConf" Int32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "targetConf" -> (Int32 -> f Int32) -> SendCoinsRequest -> f SendCoinsRequest

HasField QueryRoutesRequest "finalCltvDelta" Int32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "finalCltvDelta" -> (Int32 -> f Int32) -> QueryRoutesRequest -> f QueryRoutesRequest

HasField PendingHTLC "blocksTilMaturity" Int32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "blocksTilMaturity" -> (Int32 -> f Int32) -> PendingHTLC -> f PendingHTLC

HasField PendingChannelsResponse'ForceClosedChannel "blocksTilMaturity" Int32 
Instance details

Defined in Proto.LndGrpc

HasField Peer "flapCount" Int32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "flapCount" -> (Int32 -> f Int32) -> Peer -> f Peer

HasField OpenChannelRequest "minConfs" Int32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "minConfs" -> (Int32 -> f Int32) -> OpenChannelRequest -> f OpenChannelRequest

HasField OpenChannelRequest "targetConf" Int32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "targetConf" -> (Int32 -> f Int32) -> OpenChannelRequest -> f OpenChannelRequest

HasField ListUnspentRequest "maxConfs" Int32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maxConfs" -> (Int32 -> f Int32) -> ListUnspentRequest -> f ListUnspentRequest

HasField ListUnspentRequest "minConfs" Int32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "minConfs" -> (Int32 -> f Int32) -> ListUnspentRequest -> f ListUnspentRequest

HasField KeyLocator "keyFamily" Int32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "keyFamily" -> (Int32 -> f Int32) -> KeyLocator -> f KeyLocator

HasField KeyLocator "keyIndex" Int32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "keyIndex" -> (Int32 -> f Int32) -> KeyLocator -> f KeyLocator

HasField InvoiceHTLC "acceptHeight" Int32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "acceptHeight" -> (Int32 -> f Int32) -> InvoiceHTLC -> f InvoiceHTLC

HasField InvoiceHTLC "expiryHeight" Int32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "expiryHeight" -> (Int32 -> f Int32) -> InvoiceHTLC -> f InvoiceHTLC

HasField GetTransactionsRequest "endHeight" Int32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "endHeight" -> (Int32 -> f Int32) -> GetTransactionsRequest -> f GetTransactionsRequest

HasField GetTransactionsRequest "startHeight" Int32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "startHeight" -> (Int32 -> f Int32) -> GetTransactionsRequest -> f GetTransactionsRequest

HasField EstimateFeeRequest "minConfs" Int32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "minConfs" -> (Int32 -> f Int32) -> EstimateFeeRequest -> f EstimateFeeRequest

HasField EstimateFeeRequest "targetConf" Int32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "targetConf" -> (Int32 -> f Int32) -> EstimateFeeRequest -> f EstimateFeeRequest

HasField ConfirmationUpdate "blockHeight" Int32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "blockHeight" -> (Int32 -> f Int32) -> ConfirmationUpdate -> f ConfirmationUpdate

HasField CloseChannelRequest "targetConf" Int32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "targetConf" -> (Int32 -> f Int32) -> CloseChannelRequest -> f CloseChannelRequest

HasField SendPaymentRequest "cltvLimit" Int32 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "cltvLimit" -> (Int32 -> f Int32) -> SendPaymentRequest -> f SendPaymentRequest

HasField SendPaymentRequest "finalCltvDelta" Int32 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "finalCltvDelta" -> (Int32 -> f Int32) -> SendPaymentRequest -> f SendPaymentRequest

HasField SendPaymentRequest "timeoutSeconds" Int32 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "timeoutSeconds" -> (Int32 -> f Int32) -> SendPaymentRequest -> f SendPaymentRequest

HasField BuildRouteRequest "finalCltvDelta" Int32 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "finalCltvDelta" -> (Int32 -> f Int32) -> BuildRouteRequest -> f BuildRouteRequest

HasField UnlockWalletRequest "recoveryWindow" Int32 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

fieldOf :: Functor f => Proxy# "recoveryWindow" -> (Int32 -> f Int32) -> UnlockWalletRequest -> f UnlockWalletRequest

HasField InitWalletRequest "recoveryWindow" Int32 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

fieldOf :: Functor f => Proxy# "recoveryWindow" -> (Int32 -> f Int32) -> InitWalletRequest -> f InitWalletRequest

newtype Vector Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector Int32 = V_Int32 (Vector Int32)
type NatNumMaxBound Int32 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Int32 = 2147483647
type Difference Int32 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Int32 = Int32
type PrimSize Int32 
Instance details

Defined in Basement.PrimType

type PrimSize Int32 = 4
newtype MVector s Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Int32 = MV_Int32 (MVector s Int32)

data Int64 #

64-bit signed integer type

Instances
Bounded Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Enum Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Eq Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

(==) :: Int64 -> Int64 -> Bool #

(/=) :: Int64 -> Int64 -> Bool #

Integral Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Num Int64

Since: base-2.1

Instance details

Defined in GHC.Int

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 #

Read 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 #

Ix Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Lift Int64 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Int64 -> Q Exp #

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

NFData Int64 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int64 -> () #

FromJSON Int64 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Int64 #

parseJSONList :: Value -> Parser [Int64] #

FromJSONKey Int64 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction Int64

fromJSONKeyList :: FromJSONKeyFunction [Int64]

Hashable Int64 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int64 -> Int #

hash :: Int64 -> Int

Prim Int64 
Instance details

Defined in Data.Primitive.Types

ToJSON Int64 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Int64 -> Value

toEncoding :: Int64 -> Encoding

toJSONList :: [Int64] -> Value

toEncodingList :: [Int64] -> Encoding

ToJSONKey Int64 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction Int64

toJSONKeyList :: ToJSONKeyFunction [Int64]

Unbox Int64 
Instance details

Defined in Data.Vector.Unboxed.Base

PersistField Int64 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Int64 -> PersistValue

fromPersistValue :: PersistValue -> Either Text Int64

PersistFieldSql Int64 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Int64 -> SqlType

FieldDefault Int64 
Instance details

Defined in Data.ProtoLens.Message

PrimType Int64 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Int64 :: Nat

Methods

primSizeInBytes :: Proxy Int64 -> CountOf Word8

primShiftToBytes :: Proxy Int64 -> Int

primBaUIndex :: ByteArray# -> Offset Int64 -> Int64

primMbaURead :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Int64 -> prim Int64

primMbaUWrite :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Int64 -> Int64 -> prim ()

primAddrIndex :: Addr# -> Offset Int64 -> Int64

primAddrRead :: PrimMonad prim => Addr# -> Offset Int64 -> prim Int64

primAddrWrite :: PrimMonad prim => Addr# -> Offset Int64 -> Int64 -> prim ()

PrimMemoryComparable Int64 
Instance details

Defined in Basement.PrimType

Subtractive Int64 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Int64 :: Type

Methods

(-) :: Int64 -> Int64 -> Difference Int64

MVector MVector Int64 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s Int64 -> Int

basicUnsafeSlice :: Int -> Int -> MVector s Int64 -> MVector s Int64

basicOverlaps :: MVector s Int64 -> MVector s Int64 -> Bool

basicUnsafeNew :: PrimMonad m => Int -> m (MVector (PrimState m) Int64)

basicInitialize :: PrimMonad m => MVector (PrimState m) Int64 -> m ()

basicUnsafeReplicate :: PrimMonad m => Int -> Int64 -> m (MVector (PrimState m) Int64)

basicUnsafeRead :: PrimMonad m => MVector (PrimState m) Int64 -> Int -> m Int64

basicUnsafeWrite :: PrimMonad m => MVector (PrimState m) Int64 -> Int -> Int64 -> m ()

basicClear :: PrimMonad m => MVector (PrimState m) Int64 -> m ()

basicSet :: PrimMonad m => MVector (PrimState m) Int64 -> Int64 -> m ()

basicUnsafeCopy :: PrimMonad m => MVector (PrimState m) Int64 -> MVector (PrimState m) Int64 -> m ()

basicUnsafeMove :: PrimMonad m => MVector (PrimState m) Int64 -> MVector (PrimState m) Int64 -> m ()

basicUnsafeGrow :: PrimMonad m => MVector (PrimState m) Int64 -> Int -> m (MVector (PrimState m) Int64)

Scaling Timespan Int64 
Instance details

Defined in Chronos

Methods

scale :: Int64 -> Timespan -> Timespan

Vector Vector Int64 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: PrimMonad m => Mutable Vector (PrimState m) Int64 -> m (Vector Int64)

basicUnsafeThaw :: PrimMonad m => Vector Int64 -> m (Mutable Vector (PrimState m) Int64)

basicLength :: Vector Int64 -> Int

basicUnsafeSlice :: Int -> Int -> Vector Int64 -> Vector Int64

basicUnsafeIndexM :: Monad m => Vector Int64 -> Int -> m Int64

basicUnsafeCopy :: PrimMonad m => Mutable Vector (PrimState m) Int64 -> Vector Int64 -> m ()

elemseq :: Vector Int64 -> Int64 -> b -> b

FromGrpc Seconds Int64 Source # 
Instance details

Defined in LndClient.Data.Newtype

FromGrpc Sat Int64 Source # 
Instance details

Defined in LndClient.Data.Newtype

FromGrpc MSat Int64 Source # 
Instance details

Defined in LndClient.Data.Newtype

ToGrpc Seconds Int64 Source # 
Instance details

Defined in LndClient.Data.Newtype

ToGrpc Sat Int64 Source # 
Instance details

Defined in LndClient.Data.Newtype

ToGrpc MSat Int64 Source # 
Instance details

Defined in LndClient.Data.Newtype

HasField WalletBalanceResponse "confirmedBalance" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "confirmedBalance" -> (Int64 -> f Int64) -> WalletBalanceResponse -> f WalletBalanceResponse

HasField WalletBalanceResponse "totalBalance" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "totalBalance" -> (Int64 -> f Int64) -> WalletBalanceResponse -> f WalletBalanceResponse

HasField WalletBalanceResponse "unconfirmedBalance" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "unconfirmedBalance" -> (Int64 -> f Int64) -> WalletBalanceResponse -> f WalletBalanceResponse

HasField WalletAccountBalance "confirmedBalance" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "confirmedBalance" -> (Int64 -> f Int64) -> WalletAccountBalance -> f WalletAccountBalance

HasField WalletAccountBalance "unconfirmedBalance" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "unconfirmedBalance" -> (Int64 -> f Int64) -> WalletAccountBalance -> f WalletAccountBalance

HasField Utxo "amountSat" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "amountSat" -> (Int64 -> f Int64) -> Utxo -> f Utxo

HasField Utxo "confirmations" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "confirmations" -> (Int64 -> f Int64) -> Utxo -> f Utxo

HasField Transaction "amount" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "amount" -> (Int64 -> f Int64) -> Transaction -> f Transaction

HasField Transaction "timeStamp" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "timeStamp" -> (Int64 -> f Int64) -> Transaction -> f Transaction

HasField Transaction "totalFees" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "totalFees" -> (Int64 -> f Int64) -> Transaction -> f Transaction

HasField SendRequest "amt" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "amt" -> (Int64 -> f Int64) -> SendRequest -> f SendRequest

HasField SendRequest "amtMsat" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "amtMsat" -> (Int64 -> f Int64) -> SendRequest -> f SendRequest

HasField SendManyRequest'AddrToAmountEntry "value" Int64 
Instance details

Defined in Proto.LndGrpc

HasField SendManyRequest "satPerByte" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "satPerByte" -> (Int64 -> f Int64) -> SendManyRequest -> f SendManyRequest

HasField SendCoinsRequest "amount" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "amount" -> (Int64 -> f Int64) -> SendCoinsRequest -> f SendCoinsRequest

HasField SendCoinsRequest "satPerByte" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "satPerByte" -> (Int64 -> f Int64) -> SendCoinsRequest -> f SendCoinsRequest

HasField RoutingPolicy "feeBaseMsat" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "feeBaseMsat" -> (Int64 -> f Int64) -> RoutingPolicy -> f RoutingPolicy

HasField RoutingPolicy "feeRateMilliMsat" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "feeRateMilliMsat" -> (Int64 -> f Int64) -> RoutingPolicy -> f RoutingPolicy

HasField RoutingPolicy "minHtlc" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "minHtlc" -> (Int64 -> f Int64) -> RoutingPolicy -> f RoutingPolicy

HasField Route "totalAmt" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "totalAmt" -> (Int64 -> f Int64) -> Route -> f Route

HasField Route "totalAmtMsat" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "totalAmtMsat" -> (Int64 -> f Int64) -> Route -> f Route

HasField Route "totalFees" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "totalFees" -> (Int64 -> f Int64) -> Route -> f Route

HasField Route "totalFeesMsat" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "totalFeesMsat" -> (Int64 -> f Int64) -> Route -> f Route

HasField ReadyForPsbtFunding "fundingAmount" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "fundingAmount" -> (Int64 -> f Int64) -> ReadyForPsbtFunding -> f ReadyForPsbtFunding

HasField QueryRoutesRequest "amt" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "amt" -> (Int64 -> f Int64) -> QueryRoutesRequest -> f QueryRoutesRequest

HasField QueryRoutesRequest "amtMsat" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "amtMsat" -> (Int64 -> f Int64) -> QueryRoutesRequest -> f QueryRoutesRequest

HasField PolicyUpdateRequest "baseFeeMsat" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "baseFeeMsat" -> (Int64 -> f Int64) -> PolicyUpdateRequest -> f PolicyUpdateRequest

HasField PendingHTLC "amount" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "amount" -> (Int64 -> f Int64) -> PendingHTLC -> f PendingHTLC

HasField PendingChannelsResponse'WaitingCloseChannel "limboBalance" Int64 
Instance details

Defined in Proto.LndGrpc

HasField PendingChannelsResponse'PendingOpenChannel "commitFee" Int64 
Instance details

Defined in Proto.LndGrpc

HasField PendingChannelsResponse'PendingOpenChannel "commitWeight" Int64 
Instance details

Defined in Proto.LndGrpc

HasField PendingChannelsResponse'PendingOpenChannel "feePerKw" Int64 
Instance details

Defined in Proto.LndGrpc

HasField PendingChannelsResponse'PendingChannel "capacity" Int64 
Instance details

Defined in Proto.LndGrpc

HasField PendingChannelsResponse'PendingChannel "localBalance" Int64 
Instance details

Defined in Proto.LndGrpc

HasField PendingChannelsResponse'PendingChannel "localChanReserveSat" Int64 
Instance details

Defined in Proto.LndGrpc

HasField PendingChannelsResponse'PendingChannel "remoteBalance" Int64 
Instance details

Defined in Proto.LndGrpc

HasField PendingChannelsResponse'PendingChannel "remoteChanReserveSat" Int64 
Instance details

Defined in Proto.LndGrpc

HasField PendingChannelsResponse'ForceClosedChannel "limboBalance" Int64 
Instance details

Defined in Proto.LndGrpc

HasField PendingChannelsResponse'ForceClosedChannel "recoveredBalance" Int64 
Instance details

Defined in Proto.LndGrpc

HasField PendingChannelsResponse "totalLimboBalance" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "totalLimboBalance" -> (Int64 -> f Int64) -> PendingChannelsResponse -> f PendingChannelsResponse

HasField Peer "lastFlapNs" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "lastFlapNs" -> (Int64 -> f Int64) -> Peer -> f Peer

HasField Peer "pingTime" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "pingTime" -> (Int64 -> f Int64) -> Peer -> f Peer

HasField Peer "satRecv" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "satRecv" -> (Int64 -> f Int64) -> Peer -> f Peer

HasField Peer "satSent" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "satSent" -> (Int64 -> f Int64) -> Peer -> f Peer

HasField Payment "creationDate" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "creationDate" -> (Int64 -> f Int64) -> Payment -> f Payment

HasField Payment "creationTimeNs" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "creationTimeNs" -> (Int64 -> f Int64) -> Payment -> f Payment

HasField Payment "fee" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "fee" -> (Int64 -> f Int64) -> Payment -> f Payment

HasField Payment "feeMsat" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "feeMsat" -> (Int64 -> f Int64) -> Payment -> f Payment

HasField Payment "feeSat" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "feeSat" -> (Int64 -> f Int64) -> Payment -> f Payment

HasField Payment "value" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "value" -> (Int64 -> f Int64) -> Payment -> f Payment

HasField Payment "valueMsat" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "valueMsat" -> (Int64 -> f Int64) -> Payment -> f Payment

HasField Payment "valueSat" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "valueSat" -> (Int64 -> f Int64) -> Payment -> f Payment

HasField PayReq "cltvExpiry" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "cltvExpiry" -> (Int64 -> f Int64) -> PayReq -> f PayReq

HasField PayReq "expiry" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "expiry" -> (Int64 -> f Int64) -> PayReq -> f PayReq

HasField PayReq "numMsat" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "numMsat" -> (Int64 -> f Int64) -> PayReq -> f PayReq

HasField PayReq "numSatoshis" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "numSatoshis" -> (Int64 -> f Int64) -> PayReq -> f PayReq

HasField PayReq "timestamp" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "timestamp" -> (Int64 -> f Int64) -> PayReq -> f PayReq

HasField OpenChannelRequest "localFundingAmount" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "localFundingAmount" -> (Int64 -> f Int64) -> OpenChannelRequest -> f OpenChannelRequest

HasField OpenChannelRequest "minHtlcMsat" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "minHtlcMsat" -> (Int64 -> f Int64) -> OpenChannelRequest -> f OpenChannelRequest

HasField OpenChannelRequest "pushSat" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "pushSat" -> (Int64 -> f Int64) -> OpenChannelRequest -> f OpenChannelRequest

HasField OpenChannelRequest "satPerByte" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "satPerByte" -> (Int64 -> f Int64) -> OpenChannelRequest -> f OpenChannelRequest

HasField NodeInfo "totalCapacity" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "totalCapacity" -> (Int64 -> f Int64) -> NodeInfo -> f NodeInfo

HasField NetworkInfo "maxChannelSize" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maxChannelSize" -> (Int64 -> f Int64) -> NetworkInfo -> f NetworkInfo

HasField NetworkInfo "medianChannelSizeSat" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "medianChannelSizeSat" -> (Int64 -> f Int64) -> NetworkInfo -> f NetworkInfo

HasField NetworkInfo "minChannelSize" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "minChannelSize" -> (Int64 -> f Int64) -> NetworkInfo -> f NetworkInfo

HasField NetworkInfo "totalNetworkCapacity" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "totalNetworkCapacity" -> (Int64 -> f Int64) -> NetworkInfo -> f NetworkInfo

HasField MPPRecord "totalAmtMsat" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "totalAmtMsat" -> (Int64 -> f Int64) -> MPPRecord -> f MPPRecord

HasField InvoiceHTLC "acceptTime" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "acceptTime" -> (Int64 -> f Int64) -> InvoiceHTLC -> f InvoiceHTLC

HasField InvoiceHTLC "resolveTime" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "resolveTime" -> (Int64 -> f Int64) -> InvoiceHTLC -> f InvoiceHTLC

HasField Invoice "amtPaid" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "amtPaid" -> (Int64 -> f Int64) -> Invoice -> f Invoice

HasField Invoice "amtPaidMsat" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "amtPaidMsat" -> (Int64 -> f Int64) -> Invoice -> f Invoice

HasField Invoice "amtPaidSat" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "amtPaidSat" -> (Int64 -> f Int64) -> Invoice -> f Invoice

HasField Invoice "creationDate" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "creationDate" -> (Int64 -> f Int64) -> Invoice -> f Invoice

HasField Invoice "expiry" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "expiry" -> (Int64 -> f Int64) -> Invoice -> f Invoice

HasField Invoice "settleDate" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "settleDate" -> (Int64 -> f Int64) -> Invoice -> f Invoice

HasField Invoice "value" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "value" -> (Int64 -> f Int64) -> Invoice -> f Invoice

HasField Invoice "valueMsat" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "valueMsat" -> (Int64 -> f Int64) -> Invoice -> f Invoice

HasField Hop "amtToForward" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "amtToForward" -> (Int64 -> f Int64) -> Hop -> f Hop

HasField Hop "amtToForwardMsat" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "amtToForwardMsat" -> (Int64 -> f Int64) -> Hop -> f Hop

HasField Hop "chanCapacity" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "chanCapacity" -> (Int64 -> f Int64) -> Hop -> f Hop

HasField Hop "fee" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "fee" -> (Int64 -> f Int64) -> Hop -> f Hop

HasField Hop "feeMsat" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "feeMsat" -> (Int64 -> f Int64) -> Hop -> f Hop

HasField HTLCAttempt "attemptTimeNs" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "attemptTimeNs" -> (Int64 -> f Int64) -> HTLCAttempt -> f HTLCAttempt

HasField HTLCAttempt "resolveTimeNs" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "resolveTimeNs" -> (Int64 -> f Int64) -> HTLCAttempt -> f HTLCAttempt

HasField HTLC "amount" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "amount" -> (Int64 -> f Int64) -> HTLC -> f HTLC

HasField GetInfoResponse "bestHeaderTimestamp" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "bestHeaderTimestamp" -> (Int64 -> f Int64) -> GetInfoResponse -> f GetInfoResponse

HasField FeeLimit "fixed" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "fixed" -> (Int64 -> f Int64) -> FeeLimit -> f FeeLimit

HasField FeeLimit "fixedMsat" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "fixedMsat" -> (Int64 -> f Int64) -> FeeLimit -> f FeeLimit

HasField FeeLimit "percent" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "percent" -> (Int64 -> f Int64) -> FeeLimit -> f FeeLimit

HasField EstimateFeeResponse "feeSat" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "feeSat" -> (Int64 -> f Int64) -> EstimateFeeResponse -> f EstimateFeeResponse

HasField EstimateFeeResponse "feerateSatPerByte" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "feerateSatPerByte" -> (Int64 -> f Int64) -> EstimateFeeResponse -> f EstimateFeeResponse

HasField EstimateFeeRequest'AddrToAmountEntry "value" Int64 
Instance details

Defined in Proto.LndGrpc

HasField ClosedChannelUpdate "capacity" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "capacity" -> (Int64 -> f Int64) -> ClosedChannelUpdate -> f ClosedChannelUpdate

HasField CloseChannelRequest "satPerByte" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "satPerByte" -> (Int64 -> f Int64) -> CloseChannelRequest -> f CloseChannelRequest

HasField ChannelFeeReport "baseFeeMsat" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "baseFeeMsat" -> (Int64 -> f Int64) -> ChannelFeeReport -> f ChannelFeeReport

HasField ChannelFeeReport "feePerMil" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "feePerMil" -> (Int64 -> f Int64) -> ChannelFeeReport -> f ChannelFeeReport

HasField ChannelEdgeUpdate "capacity" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "capacity" -> (Int64 -> f Int64) -> ChannelEdgeUpdate -> f ChannelEdgeUpdate

HasField ChannelEdge "capacity" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "capacity" -> (Int64 -> f Int64) -> ChannelEdge -> f ChannelEdge

HasField ChannelCloseSummary "capacity" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "capacity" -> (Int64 -> f Int64) -> ChannelCloseSummary -> f ChannelCloseSummary

HasField ChannelCloseSummary "settledBalance" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "settledBalance" -> (Int64 -> f Int64) -> ChannelCloseSummary -> f ChannelCloseSummary

HasField ChannelCloseSummary "timeLockedBalance" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "timeLockedBalance" -> (Int64 -> f Int64) -> ChannelCloseSummary -> f ChannelCloseSummary

HasField ChannelBalanceResponse "balance" Int64 
Instance details

Defined in Proto.LndGrpc

HasField ChannelBalanceResponse "pendingOpenBalance" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "pendingOpenBalance" -> (Int64 -> f Int64) -> ChannelBalanceResponse -> f ChannelBalanceResponse

HasField Channel "capacity" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "capacity" -> (Int64 -> f Int64) -> Channel -> f Channel

HasField Channel "commitFee" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "commitFee" -> (Int64 -> f Int64) -> Channel -> f Channel

HasField Channel "commitWeight" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "commitWeight" -> (Int64 -> f Int64) -> Channel -> f Channel

HasField Channel "feePerKw" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "feePerKw" -> (Int64 -> f Int64) -> Channel -> f Channel

HasField Channel "lifetime" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "lifetime" -> (Int64 -> f Int64) -> Channel -> f Channel

HasField Channel "localBalance" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "localBalance" -> (Int64 -> f Int64) -> Channel -> f Channel

HasField Channel "localChanReserveSat" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "localChanReserveSat" -> (Int64 -> f Int64) -> Channel -> f Channel

HasField Channel "remoteBalance" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "remoteBalance" -> (Int64 -> f Int64) -> Channel -> f Channel

HasField Channel "remoteChanReserveSat" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "remoteChanReserveSat" -> (Int64 -> f Int64) -> Channel -> f Channel

HasField Channel "totalSatoshisReceived" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "totalSatoshisReceived" -> (Int64 -> f Int64) -> Channel -> f Channel

HasField Channel "totalSatoshisSent" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "totalSatoshisSent" -> (Int64 -> f Int64) -> Channel -> f Channel

HasField Channel "unsettledBalance" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "unsettledBalance" -> (Int64 -> f Int64) -> Channel -> f Channel

HasField Channel "uptime" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "uptime" -> (Int64 -> f Int64) -> Channel -> f Channel

HasField ChanPointShim "amt" Int64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "amt" -> (Int64 -> f Int64) -> ChanPointShim -> f ChanPointShim

HasField AddHoldInvoiceRequest "expiry" Int64 
Instance details

Defined in Proto.InvoiceGrpc

Methods

fieldOf :: Functor f => Proxy# "expiry" -> (Int64 -> f Int64) -> AddHoldInvoiceRequest -> f AddHoldInvoiceRequest

HasField AddHoldInvoiceRequest "value" Int64 
Instance details

Defined in Proto.InvoiceGrpc

HasField AddHoldInvoiceRequest "valueMsat" Int64 
Instance details

Defined in Proto.InvoiceGrpc

Methods

fieldOf :: Functor f => Proxy# "valueMsat" -> (Int64 -> f Int64) -> AddHoldInvoiceRequest -> f AddHoldInvoiceRequest

HasField SendPaymentRequest "amt" Int64 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "amt" -> (Int64 -> f Int64) -> SendPaymentRequest -> f SendPaymentRequest

HasField SendPaymentRequest "amtMsat" Int64 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "amtMsat" -> (Int64 -> f Int64) -> SendPaymentRequest -> f SendPaymentRequest

HasField SendPaymentRequest "feeLimitMsat" Int64 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "feeLimitMsat" -> (Int64 -> f Int64) -> SendPaymentRequest -> f SendPaymentRequest

HasField SendPaymentRequest "feeLimitSat" Int64 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "feeLimitSat" -> (Int64 -> f Int64) -> SendPaymentRequest -> f SendPaymentRequest

HasField RouteFeeResponse "routingFeeMsat" Int64 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "routingFeeMsat" -> (Int64 -> f Int64) -> RouteFeeResponse -> f RouteFeeResponse

HasField RouteFeeResponse "timeLockDelay" Int64 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "timeLockDelay" -> (Int64 -> f Int64) -> RouteFeeResponse -> f RouteFeeResponse

HasField RouteFeeRequest "amtSat" Int64 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "amtSat" -> (Int64 -> f Int64) -> RouteFeeRequest -> f RouteFeeRequest

HasField QueryProbabilityRequest "amtMsat" Int64 
Instance details

Defined in Proto.RouterGrpc

HasField PairData "failAmtMsat" Int64 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "failAmtMsat" -> (Int64 -> f Int64) -> PairData -> f PairData

HasField PairData "failAmtSat" Int64 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "failAmtSat" -> (Int64 -> f Int64) -> PairData -> f PairData

HasField PairData "failTime" Int64 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "failTime" -> (Int64 -> f Int64) -> PairData -> f PairData

HasField PairData "successAmtMsat" Int64 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "successAmtMsat" -> (Int64 -> f Int64) -> PairData -> f PairData

HasField PairData "successAmtSat" Int64 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "successAmtSat" -> (Int64 -> f Int64) -> PairData -> f PairData

HasField PairData "successTime" Int64 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "successTime" -> (Int64 -> f Int64) -> PairData -> f PairData

HasField BuildRouteRequest "amtMsat" Int64 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "amtMsat" -> (Int64 -> f Int64) -> BuildRouteRequest -> f BuildRouteRequest

HasField FeeLimit "maybe'fixed" (Maybe Int64) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'fixed" -> (Maybe Int64 -> f (Maybe Int64)) -> FeeLimit -> f FeeLimit

HasField FeeLimit "maybe'fixedMsat" (Maybe Int64) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'fixedMsat" -> (Maybe Int64 -> f (Maybe Int64)) -> FeeLimit -> f FeeLimit

HasField FeeLimit "maybe'percent" (Maybe Int64) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'percent" -> (Maybe Int64 -> f (Maybe Int64)) -> FeeLimit -> f FeeLimit

HasField SendManyRequest "addrToAmount" (Map Text Int64) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "addrToAmount" -> (Map Text Int64 -> f (Map Text Int64)) -> SendManyRequest -> f SendManyRequest

HasField EstimateFeeRequest "addrToAmount" (Map Text Int64) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "addrToAmount" -> (Map Text Int64 -> f (Map Text Int64)) -> EstimateFeeRequest -> f EstimateFeeRequest

newtype Vector Int64 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector Int64 = V_Int64 (Vector Int64)
type NatNumMaxBound Int64 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Int64 = 9223372036854775807
type Difference Int64 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Int64 = Int64
type PrimSize Int64 
Instance details

Defined in Basement.PrimType

type PrimSize Int64 = 8
newtype MVector s Int64 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Int64 = MV_Int64 (MVector s Int64)

data Integer #

Invariant: Jn# and Jp# are used iff value doesn't fit in S#

Useful properties resulting from the invariants:

Instances
Enum Integer

Since: base-2.1

Instance details

Defined in GHC.Enum

Eq Integer 
Instance details

Defined in GHC.Integer.Type

Methods

(==) :: Integer -> Integer -> Bool #

(/=) :: Integer -> Integer -> Bool #

Integral Integer

Since: base-2.0.1

Instance details

Defined in GHC.Real

Num Integer

Since: base-2.1

Instance details

Defined in GHC.Num

Ord Integer 
Instance details

Defined in GHC.Integer.Type

Read Integer

Since: base-2.1

Instance details

Defined in GHC.Read

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

Lift Integer 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Integer -> Q Exp #

Bits Integer

Since: base-2.1

Instance details

Defined in Data.Bits

NFData Integer 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Integer -> () #

FromJSON Integer 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Integer #

parseJSONList :: Value -> Parser [Integer] #

FromJSONKey Integer 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction Integer

fromJSONKeyList :: FromJSONKeyFunction [Integer]

Hashable Integer 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Integer -> Int #

hash :: Integer -> Int

ToJSON Integer 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Integer -> Value

toEncoding :: Integer -> Encoding

toJSONList :: [Integer] -> Value

toEncodingList :: [Integer] -> Encoding

ToJSONKey Integer 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction Integer

toJSONKeyList :: ToJSONKeyFunction [Integer]

PersistField Rational 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Rational -> PersistValue

fromPersistValue :: PersistValue -> Either Text Rational

PersistFieldSql Rational 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Rational -> SqlType

Subtractive Integer 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Integer :: Type

Methods

(-) :: Integer -> Integer -> Difference Integer

type Difference Integer 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Integer = Integer

data Natural #

Type representing arbitrary-precision non-negative integers.

>>> 2^100 :: Natural
1267650600228229401496703205376

Operations whose result would be negative throw (Underflow :: ArithException),

>>> -1 :: Natural
*** Exception: arithmetic underflow

Since: base-4.8.0.0

Instances
Enum Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Enum

Eq Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Natural

Methods

(==) :: Natural -> Natural -> Bool #

(/=) :: Natural -> Natural -> Bool #

Integral Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Real

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

Ord Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Natural

Read Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Read

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

Lift Natural 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Natural -> Q Exp #

Bits Natural

Since: base-4.8.0

Instance details

Defined in Data.Bits

NFData Natural

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Natural -> () #

FromJSON Natural 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Natural #

parseJSONList :: Value -> Parser [Natural] #

FromJSONKey Natural 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction Natural

fromJSONKeyList :: FromJSONKeyFunction [Natural]

Hashable Natural 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Natural -> Int #

hash :: Natural -> Int

ToJSON Natural 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Natural -> Value

toEncoding :: Natural -> Encoding

toJSONList :: [Natural] -> Value

toEncodingList :: [Natural] -> Encoding

ToJSONKey Natural 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction Natural

toJSONKeyList :: ToJSONKeyFunction [Natural]

(TypeError (((((Text "The instance of PersistField for the Natural type was removed." :$$: Text "Please see the documentation for OverflowNatural if you want to ") :$$: Text "continue using the old behavior or want to see documentation on ") :$$: Text "why the instance was removed.") :$$: Text "") :$$: Text "This error instance will be removed in a future release.") :: Constraint) => PersistField Natural 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Natural -> PersistValue

fromPersistValue :: PersistValue -> Either Text Natural

Subtractive Natural 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Natural :: Type

Methods

(-) :: Natural -> Natural -> Difference Natural

type Difference Natural 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Natural = Maybe Natural

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
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 #

fail :: String -> 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 #

MonadFail Maybe

Since: base-4.9.0.0

Instance details

Defined in Control.Monad.Fail

Methods

fail :: String -> 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 #

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 #

foldr :: (a -> b -> b) -> b -> Maybe a -> b #

foldr' :: (a -> b -> b) -> b -> Maybe a -> b #

foldl :: (b -> a -> b) -> b -> Maybe a -> b #

foldl' :: (b -> a -> b) -> b -> Maybe a -> b #

foldr1 :: (a -> a -> a) -> Maybe a -> a #

foldl1 :: (a -> a -> a) -> Maybe a -> a #

toList :: Maybe a -> [a] #

null :: Maybe a -> Bool #

length :: Maybe a -> Int #

elem :: Eq a => a -> Maybe a -> Bool #

maximum :: Ord a => Maybe a -> a #

minimum :: Ord a => Maybe a -> a #

sum :: Num a => Maybe a -> a #

product :: Num a => Maybe a -> a #

Traversable Maybe

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) #

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 #

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] #

MonadPlus Maybe

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

mzero :: Maybe a #

mplus :: Maybe a -> Maybe a -> Maybe a #

NFData1 Maybe

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (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

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

MonadFailure Maybe 
Instance details

Defined in Basement.Monad

Associated Types

type Failure Maybe :: Type

Methods

mFail :: Failure Maybe -> Maybe ()

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 #

MonadBaseControl Maybe Maybe 
Instance details

Defined in Control.Monad.Trans.Control

Associated Types

type StM Maybe a :: Type

Methods

liftBaseWith :: (RunInBase Maybe Maybe -> Maybe a) -> Maybe a

restoreM :: StM Maybe a -> Maybe a

(Selector s, GToJSON enc arity (K1 i (Maybe a) :: Type -> Type), KeyValuePair enc pairs, Monoid pairs) => RecordToPairs enc pairs arity (S1 s (K1 i (Maybe a) :: Type -> Type)) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

recordToPairs :: Options -> ToArgs enc arity a0 -> S1 s (K1 i (Maybe a)) a0 -> pairs

HasField WalletBalanceResponse'AccountBalanceEntry "maybe'value" (Maybe WalletAccountBalance) 
Instance details

Defined in Proto.LndGrpc

HasField Utxo "maybe'outpoint" (Maybe OutPoint) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'outpoint" -> (Maybe OutPoint -> f (Maybe OutPoint)) -> Utxo -> f Utxo

HasField SendToRouteRequest "maybe'route" (Maybe Route) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'route" -> (Maybe Route -> f (Maybe Route)) -> SendToRouteRequest -> f SendToRouteRequest

HasField SendResponse "maybe'paymentRoute" (Maybe Route) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'paymentRoute" -> (Maybe Route -> f (Maybe Route)) -> SendResponse -> f SendResponse

HasField SendRequest "maybe'feeLimit" (Maybe FeeLimit) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'feeLimit" -> (Maybe FeeLimit -> f (Maybe FeeLimit)) -> SendRequest -> f SendRequest

HasField RestoreChanBackupRequest "maybe'backup" (Maybe RestoreChanBackupRequest'Backup) 
Instance details

Defined in Proto.LndGrpc

HasField RestoreChanBackupRequest "maybe'chanBackups" (Maybe ChannelBackups) 
Instance details

Defined in Proto.LndGrpc

HasField RestoreChanBackupRequest "maybe'multiChanBackup" (Maybe ByteString) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'multiChanBackup" -> (Maybe ByteString -> f (Maybe ByteString)) -> RestoreChanBackupRequest -> f RestoreChanBackupRequest

HasField Resolution "maybe'outpoint" (Maybe OutPoint) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'outpoint" -> (Maybe OutPoint -> f (Maybe OutPoint)) -> Resolution -> f Resolution

HasField QueryRoutesRequest "maybe'feeLimit" (Maybe FeeLimit) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'feeLimit" -> (Maybe FeeLimit -> f (Maybe FeeLimit)) -> QueryRoutesRequest -> f QueryRoutesRequest

HasField PolicyUpdateRequest "maybe'chanPoint" (Maybe ChannelPoint) 
Instance details

Defined in Proto.LndGrpc

HasField PolicyUpdateRequest "maybe'global" (Maybe Bool) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'global" -> (Maybe Bool -> f (Maybe Bool)) -> PolicyUpdateRequest -> f PolicyUpdateRequest

HasField PolicyUpdateRequest "maybe'scope" (Maybe PolicyUpdateRequest'Scope) 
Instance details

Defined in Proto.LndGrpc

HasField PendingChannelsResponse'WaitingCloseChannel "maybe'channel" (Maybe PendingChannelsResponse'PendingChannel) 
Instance details

Defined in Proto.LndGrpc

HasField PendingChannelsResponse'WaitingCloseChannel "maybe'commitments" (Maybe PendingChannelsResponse'Commitments) 
Instance details

Defined in Proto.LndGrpc

HasField PendingChannelsResponse'PendingOpenChannel "maybe'channel" (Maybe PendingChannelsResponse'PendingChannel) 
Instance details

Defined in Proto.LndGrpc

HasField PendingChannelsResponse'ForceClosedChannel "maybe'channel" (Maybe PendingChannelsResponse'PendingChannel) 
Instance details

Defined in Proto.LndGrpc

HasField PendingChannelsResponse'ClosedChannel "maybe'channel" (Maybe PendingChannelsResponse'PendingChannel) 
Instance details

Defined in Proto.LndGrpc

HasField Peer'FeaturesEntry "maybe'value" (Maybe Feature) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'value" -> (Maybe Feature -> f (Maybe Feature)) -> Peer'FeaturesEntry -> f Peer'FeaturesEntry

HasField PayReq'FeaturesEntry "maybe'value" (Maybe Feature) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'value" -> (Maybe Feature -> f (Maybe Feature)) -> PayReq'FeaturesEntry -> f PayReq'FeaturesEntry

HasField OpenStatusUpdate "maybe'chanOpen" (Maybe ChannelOpenUpdate) 
Instance details

Defined in Proto.LndGrpc

HasField OpenStatusUpdate "maybe'chanPending" (Maybe PendingUpdate) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'chanPending" -> (Maybe PendingUpdate -> f (Maybe PendingUpdate)) -> OpenStatusUpdate -> f OpenStatusUpdate

HasField OpenStatusUpdate "maybe'psbtFund" (Maybe ReadyForPsbtFunding) 
Instance details

Defined in Proto.LndGrpc

HasField OpenStatusUpdate "maybe'update" (Maybe OpenStatusUpdate'Update) 
Instance details

Defined in Proto.LndGrpc

HasField OpenChannelRequest "maybe'fundingShim" (Maybe FundingShim) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'fundingShim" -> (Maybe FundingShim -> f (Maybe FundingShim)) -> OpenChannelRequest -> f OpenChannelRequest

HasField NodeUpdate'FeaturesEntry "maybe'value" (Maybe Feature) 
Instance details

Defined in Proto.LndGrpc

HasField NodeMetricsResponse'BetweennessCentralityEntry "maybe'value" (Maybe FloatMetric) 
Instance details

Defined in Proto.LndGrpc

HasField NodeInfo "maybe'node" (Maybe LightningNode) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'node" -> (Maybe LightningNode -> f (Maybe LightningNode)) -> NodeInfo -> f NodeInfo

HasField ListPermissionsResponse'MethodPermissionsEntry "maybe'value" (Maybe MacaroonPermissionList) 
Instance details

Defined in Proto.LndGrpc

HasField LightningNode'FeaturesEntry "maybe'value" (Maybe Feature) 
Instance details

Defined in Proto.LndGrpc

HasField KeyDescriptor "maybe'keyLoc" (Maybe KeyLocator) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'keyLoc" -> (Maybe KeyLocator -> f (Maybe KeyLocator)) -> KeyDescriptor -> f KeyDescriptor

HasField InvoiceHTLC "maybe'amp" (Maybe AMP) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'amp" -> (Maybe AMP -> f (Maybe AMP)) -> InvoiceHTLC -> f InvoiceHTLC

HasField Invoice'FeaturesEntry "maybe'value" (Maybe Feature) 
Instance details

Defined in Proto.LndGrpc

HasField Hop "maybe'ampRecord" (Maybe AMPRecord) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'ampRecord" -> (Maybe AMPRecord -> f (Maybe AMPRecord)) -> Hop -> f Hop

HasField Hop "maybe'mppRecord" (Maybe MPPRecord) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'mppRecord" -> (Maybe MPPRecord -> f (Maybe MPPRecord)) -> Hop -> f Hop

HasField HTLCAttempt "maybe'failure" (Maybe Failure) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'failure" -> (Maybe Failure -> f (Maybe Failure)) -> HTLCAttempt -> f HTLCAttempt

HasField HTLCAttempt "maybe'route" (Maybe Route) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'route" -> (Maybe Route -> f (Maybe Route)) -> HTLCAttempt -> f HTLCAttempt

HasField GetInfoResponse'FeaturesEntry "maybe'value" (Maybe Feature) 
Instance details

Defined in Proto.LndGrpc

HasField FundingTransitionMsg "maybe'psbtFinalize" (Maybe FundingPsbtFinalize) 
Instance details

Defined in Proto.LndGrpc

HasField FundingTransitionMsg "maybe'psbtVerify" (Maybe FundingPsbtVerify) 
Instance details

Defined in Proto.LndGrpc

HasField FundingTransitionMsg "maybe'shimCancel" (Maybe FundingShimCancel) 
Instance details

Defined in Proto.LndGrpc

HasField FundingTransitionMsg "maybe'shimRegister" (Maybe FundingShim) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'shimRegister" -> (Maybe FundingShim -> f (Maybe FundingShim)) -> FundingTransitionMsg -> f FundingTransitionMsg

HasField FundingTransitionMsg "maybe'trigger" (Maybe FundingTransitionMsg'Trigger) 
Instance details

Defined in Proto.LndGrpc

HasField FundingShim "maybe'chanPointShim" (Maybe ChanPointShim) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'chanPointShim" -> (Maybe ChanPointShim -> f (Maybe ChanPointShim)) -> FundingShim -> f FundingShim

HasField FundingShim "maybe'psbtShim" (Maybe PsbtShim) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'psbtShim" -> (Maybe PsbtShim -> f (Maybe PsbtShim)) -> FundingShim -> f FundingShim

HasField FundingShim "maybe'shim" (Maybe FundingShim'Shim) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'shim" -> (Maybe FundingShim'Shim -> f (Maybe FundingShim'Shim)) -> FundingShim -> f FundingShim

HasField FeeLimit "maybe'fixed" (Maybe Int64) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'fixed" -> (Maybe Int64 -> f (Maybe Int64)) -> FeeLimit -> f FeeLimit

HasField FeeLimit "maybe'fixedMsat" (Maybe Int64) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'fixedMsat" -> (Maybe Int64 -> f (Maybe Int64)) -> FeeLimit -> f FeeLimit

HasField FeeLimit "maybe'limit" (Maybe FeeLimit'Limit) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'limit" -> (Maybe FeeLimit'Limit -> f (Maybe FeeLimit'Limit)) -> FeeLimit -> f FeeLimit

HasField FeeLimit "maybe'percent" (Maybe Int64) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'percent" -> (Maybe Int64 -> f (Maybe Int64)) -> FeeLimit -> f FeeLimit

HasField Failure "maybe'channelUpdate" (Maybe ChannelUpdate) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'channelUpdate" -> (Maybe ChannelUpdate -> f (Maybe ChannelUpdate)) -> Failure -> f Failure

HasField ExportChannelBackupRequest "maybe'chanPoint" (Maybe ChannelPoint) 
Instance details

Defined in Proto.LndGrpc

HasField ConnectPeerRequest "maybe'addr" (Maybe LightningAddress) 
Instance details

Defined in Proto.LndGrpc

HasField ClosedChannelUpdate "maybe'chanPoint" (Maybe ChannelPoint) 
Instance details

Defined in Proto.LndGrpc

HasField CloseStatusUpdate "maybe'chanClose" (Maybe ChannelCloseUpdate) 
Instance details

Defined in Proto.LndGrpc

HasField CloseStatusUpdate "maybe'closePending" (Maybe PendingUpdate) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'closePending" -> (Maybe PendingUpdate -> f (Maybe PendingUpdate)) -> CloseStatusUpdate -> f CloseStatusUpdate

HasField CloseStatusUpdate "maybe'update" (Maybe CloseStatusUpdate'Update) 
Instance details

Defined in Proto.LndGrpc

HasField CloseChannelRequest "maybe'channelPoint" (Maybe ChannelPoint) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'channelPoint" -> (Maybe ChannelPoint -> f (Maybe ChannelPoint)) -> CloseChannelRequest -> f CloseChannelRequest

HasField ChannelPoint "maybe'fundingTxid" (Maybe ChannelPoint'FundingTxid) 
Instance details

Defined in Proto.LndGrpc

HasField ChannelPoint "maybe'fundingTxidBytes" (Maybe ByteString) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'fundingTxidBytes" -> (Maybe ByteString -> f (Maybe ByteString)) -> ChannelPoint -> f ChannelPoint

HasField ChannelPoint "maybe'fundingTxidStr" (Maybe Text) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'fundingTxidStr" -> (Maybe Text -> f (Maybe Text)) -> ChannelPoint -> f ChannelPoint

HasField ChannelOpenUpdate "maybe'channelPoint" (Maybe ChannelPoint) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'channelPoint" -> (Maybe ChannelPoint -> f (Maybe ChannelPoint)) -> ChannelOpenUpdate -> f ChannelOpenUpdate

HasField ChannelEventUpdate "maybe'activeChannel" (Maybe ChannelPoint) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'activeChannel" -> (Maybe ChannelPoint -> f (Maybe ChannelPoint)) -> ChannelEventUpdate -> f ChannelEventUpdate

HasField ChannelEventUpdate "maybe'channel" (Maybe ChannelEventUpdate'Channel) 
Instance details

Defined in Proto.LndGrpc

HasField ChannelEventUpdate "maybe'closedChannel" (Maybe ChannelCloseSummary) 
Instance details

Defined in Proto.LndGrpc

HasField ChannelEventUpdate "maybe'inactiveChannel" (Maybe ChannelPoint) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'inactiveChannel" -> (Maybe ChannelPoint -> f (Maybe ChannelPoint)) -> ChannelEventUpdate -> f ChannelEventUpdate

HasField ChannelEventUpdate "maybe'openChannel" (Maybe Channel) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'openChannel" -> (Maybe Channel -> f (Maybe Channel)) -> ChannelEventUpdate -> f ChannelEventUpdate

HasField ChannelEventUpdate "maybe'pendingOpenChannel" (Maybe PendingUpdate) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'pendingOpenChannel" -> (Maybe PendingUpdate -> f (Maybe PendingUpdate)) -> ChannelEventUpdate -> f ChannelEventUpdate

HasField ChannelEdgeUpdate "maybe'chanPoint" (Maybe ChannelPoint) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'chanPoint" -> (Maybe ChannelPoint -> f (Maybe ChannelPoint)) -> ChannelEdgeUpdate -> f ChannelEdgeUpdate

HasField ChannelEdgeUpdate "maybe'routingPolicy" (Maybe RoutingPolicy) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'routingPolicy" -> (Maybe RoutingPolicy -> f (Maybe RoutingPolicy)) -> ChannelEdgeUpdate -> f ChannelEdgeUpdate

HasField ChannelEdge "maybe'node1Policy" (Maybe RoutingPolicy) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'node1Policy" -> (Maybe RoutingPolicy -> f (Maybe RoutingPolicy)) -> ChannelEdge -> f ChannelEdge

HasField ChannelEdge "maybe'node2Policy" (Maybe RoutingPolicy) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'node2Policy" -> (Maybe RoutingPolicy -> f (Maybe RoutingPolicy)) -> ChannelEdge -> f ChannelEdge

HasField ChannelBalanceResponse "maybe'localBalance" (Maybe Amount) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'localBalance" -> (Maybe Amount -> f (Maybe Amount)) -> ChannelBalanceResponse -> f ChannelBalanceResponse

HasField ChannelBalanceResponse "maybe'pendingOpenLocalBalance" (Maybe Amount) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'pendingOpenLocalBalance" -> (Maybe Amount -> f (Maybe Amount)) -> ChannelBalanceResponse -> f ChannelBalanceResponse

HasField ChannelBalanceResponse "maybe'pendingOpenRemoteBalance" (Maybe Amount) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'pendingOpenRemoteBalance" -> (Maybe Amount -> f (Maybe Amount)) -> ChannelBalanceResponse -> f ChannelBalanceResponse

HasField ChannelBalanceResponse "maybe'remoteBalance" (Maybe Amount) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'remoteBalance" -> (Maybe Amount -> f (Maybe Amount)) -> ChannelBalanceResponse -> f ChannelBalanceResponse

HasField ChannelBalanceResponse "maybe'unsettledLocalBalance" (Maybe Amount) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'unsettledLocalBalance" -> (Maybe Amount -> f (Maybe Amount)) -> ChannelBalanceResponse -> f ChannelBalanceResponse

HasField ChannelBalanceResponse "maybe'unsettledRemoteBalance" (Maybe Amount) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'unsettledRemoteBalance" -> (Maybe Amount -> f (Maybe Amount)) -> ChannelBalanceResponse -> f ChannelBalanceResponse

HasField ChannelBackup "maybe'chanPoint" (Maybe ChannelPoint) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'chanPoint" -> (Maybe ChannelPoint -> f (Maybe ChannelPoint)) -> ChannelBackup -> f ChannelBackup

HasField Channel "maybe'localConstraints" (Maybe ChannelConstraints) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'localConstraints" -> (Maybe ChannelConstraints -> f (Maybe ChannelConstraints)) -> Channel -> f Channel

HasField Channel "maybe'remoteConstraints" (Maybe ChannelConstraints) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'remoteConstraints" -> (Maybe ChannelConstraints -> f (Maybe ChannelConstraints)) -> Channel -> f Channel

HasField ChanPointShim "maybe'chanPoint" (Maybe ChannelPoint) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'chanPoint" -> (Maybe ChannelPoint -> f (Maybe ChannelPoint)) -> ChanPointShim -> f ChanPointShim

HasField ChanPointShim "maybe'localKey" (Maybe KeyDescriptor) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'localKey" -> (Maybe KeyDescriptor -> f (Maybe KeyDescriptor)) -> ChanPointShim -> f ChanPointShim

HasField ChanBackupSnapshot "maybe'multiChanBackup" (Maybe MultiChanBackup) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'multiChanBackup" -> (Maybe MultiChanBackup -> f (Maybe MultiChanBackup)) -> ChanBackupSnapshot -> f ChanBackupSnapshot

HasField ChanBackupSnapshot "maybe'singleChanBackups" (Maybe ChannelBackups) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'singleChanBackups" -> (Maybe ChannelBackups -> f (Maybe ChannelBackups)) -> ChanBackupSnapshot -> f ChanBackupSnapshot

HasField AbandonChannelRequest "maybe'channelPoint" (Maybe ChannelPoint) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'channelPoint" -> (Maybe ChannelPoint -> f (Maybe ChannelPoint)) -> AbandonChannelRequest -> f AbandonChannelRequest

HasField UpdateChanStatusRequest "maybe'chanPoint" (Maybe ChannelPoint) 
Instance details

Defined in Proto.RouterGrpc

HasField SetMissionControlConfigRequest "maybe'config" (Maybe MissionControlConfig) 
Instance details

Defined in Proto.RouterGrpc

HasField SendToRouteResponse "maybe'failure" (Maybe Failure) 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'failure" -> (Maybe Failure -> f (Maybe Failure)) -> SendToRouteResponse -> f SendToRouteResponse

HasField SendToRouteRequest "maybe'route" (Maybe Route) 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'route" -> (Maybe Route -> f (Maybe Route)) -> SendToRouteRequest -> f SendToRouteRequest

HasField QueryProbabilityResponse "maybe'history" (Maybe PairData) 
Instance details

Defined in Proto.RouterGrpc

HasField PairHistory "maybe'history" (Maybe PairData) 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'history" -> (Maybe PairData -> f (Maybe PairData)) -> PairHistory -> f PairHistory

HasField LinkFailEvent "maybe'info" (Maybe HtlcInfo) 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'info" -> (Maybe HtlcInfo -> f (Maybe HtlcInfo)) -> LinkFailEvent -> f LinkFailEvent

HasField HtlcEvent "maybe'event" (Maybe HtlcEvent'Event) 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'event" -> (Maybe HtlcEvent'Event -> f (Maybe HtlcEvent'Event)) -> HtlcEvent -> f HtlcEvent

HasField HtlcEvent "maybe'forwardEvent" (Maybe ForwardEvent) 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'forwardEvent" -> (Maybe ForwardEvent -> f (Maybe ForwardEvent)) -> HtlcEvent -> f HtlcEvent

HasField HtlcEvent "maybe'forwardFailEvent" (Maybe ForwardFailEvent) 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'forwardFailEvent" -> (Maybe ForwardFailEvent -> f (Maybe ForwardFailEvent)) -> HtlcEvent -> f HtlcEvent

HasField HtlcEvent "maybe'linkFailEvent" (Maybe LinkFailEvent) 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'linkFailEvent" -> (Maybe LinkFailEvent -> f (Maybe LinkFailEvent)) -> HtlcEvent -> f HtlcEvent

HasField HtlcEvent "maybe'settleEvent" (Maybe SettleEvent) 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'settleEvent" -> (Maybe SettleEvent -> f (Maybe SettleEvent)) -> HtlcEvent -> f HtlcEvent

HasField GetMissionControlConfigResponse "maybe'config" (Maybe MissionControlConfig) 
Instance details

Defined in Proto.RouterGrpc

HasField ForwardHtlcInterceptResponse "maybe'incomingCircuitKey" (Maybe CircuitKey) 
Instance details

Defined in Proto.RouterGrpc

HasField ForwardHtlcInterceptRequest "maybe'incomingCircuitKey" (Maybe CircuitKey) 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'incomingCircuitKey" -> (Maybe CircuitKey -> f (Maybe CircuitKey)) -> ForwardHtlcInterceptRequest -> f ForwardHtlcInterceptRequest

HasField ForwardEvent "maybe'info" (Maybe HtlcInfo) 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'info" -> (Maybe HtlcInfo -> f (Maybe HtlcInfo)) -> ForwardEvent -> f ForwardEvent

HasField BuildRouteResponse "maybe'route" (Maybe Route) 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'route" -> (Maybe Route -> f (Maybe Route)) -> BuildRouteResponse -> f BuildRouteResponse

HasField UnlockWalletRequest "maybe'channelBackups" (Maybe ChanBackupSnapshot) 
Instance details

Defined in Proto.WalletUnlockerGrpc

HasField InitWalletRequest "maybe'channelBackups" (Maybe ChanBackupSnapshot) 
Instance details

Defined in Proto.WalletUnlockerGrpc

(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)

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 #

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 #

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 #

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 => 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 #

Lift a => Lift (Maybe a) 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Maybe a -> Q Exp #

SingKind a => SingKind (Maybe a)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Associated Types

type DemoteRep (Maybe a) :: Type

Methods

fromSing :: Sing a0 -> DemoteRep (Maybe a)

NFData a => NFData (Maybe a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Maybe a -> () #

FromJSON a => FromJSON (Maybe a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Maybe a) #

parseJSONList :: Value -> Parser [Maybe a] #

Hashable a => Hashable (Maybe a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Maybe a -> Int #

hash :: Maybe a -> Int

ToJSON a => ToJSON (Maybe a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Maybe a -> Value

toEncoding :: Maybe a -> Encoding

toJSONList :: [Maybe a] -> Value

toEncodingList :: [Maybe a] -> Encoding

PersistField a => PersistField (Maybe a) 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Maybe a -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Maybe a)

RawSql a => RawSql (Maybe a) 
Instance details

Defined in Database.Persist.Sql.Class

Methods

rawSqlCols :: (DBName -> Text) -> Maybe a -> (Int, [Text])

rawSqlColCountReason :: Maybe a -> String

rawSqlProcessRow :: [PersistValue] -> Either Text (Maybe a)

(TypeError (DisallowInstance "Maybe") :: Constraint) => Container (Maybe a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Maybe a) :: Type #

Methods

toList :: Maybe a -> [Element (Maybe a)] #

null :: Maybe a -> Bool #

foldr :: (Element (Maybe a) -> b -> b) -> b -> Maybe a -> b #

foldl :: (b -> Element (Maybe a) -> b) -> b -> Maybe a -> b #

foldl' :: (b -> Element (Maybe a) -> b) -> b -> Maybe a -> b #

length :: Maybe a -> Int #

elem :: Element (Maybe a) -> Maybe a -> Bool #

maximum :: Maybe a -> Element (Maybe a) #

minimum :: Maybe a -> Element (Maybe a) #

foldMap :: Monoid m => (Element (Maybe a) -> m) -> Maybe a -> m #

fold :: Maybe a -> Element (Maybe a) #

foldr' :: (Element (Maybe a) -> b -> b) -> b -> Maybe a -> b #

foldr1 :: (Element (Maybe a) -> Element (Maybe a) -> Element (Maybe a)) -> Maybe a -> Element (Maybe a) #

foldl1 :: (Element (Maybe a) -> Element (Maybe a) -> Element (Maybe a)) -> Maybe a -> Element (Maybe a) #

notElem :: Element (Maybe a) -> Maybe a -> Bool #

all :: (Element (Maybe a) -> Bool) -> Maybe a -> Bool #

any :: (Element (Maybe a) -> Bool) -> Maybe a -> Bool #

and :: Maybe a -> Bool #

or :: Maybe a -> Bool #

find :: (Element (Maybe a) -> Bool) -> Maybe a -> Maybe (Element (Maybe a)) #

safeHead :: Maybe a -> Maybe (Element (Maybe a)) #

Generic1 Maybe 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 Maybe :: k -> Type #

Methods

from1 :: Maybe a -> Rep1 Maybe a #

to1 :: Rep1 Maybe a -> Maybe a #

(FieldDefault b, FromGrpc a b) => FromGrpc (Maybe a) b Source # 
Instance details

Defined in LndClient.Class

Methods

fromGrpc :: b -> Either LndError (Maybe a) Source #

(FieldDefault b, ToGrpc a b) => ToGrpc (Maybe a) b Source # 
Instance details

Defined in LndClient.Class

Methods

toGrpc :: Maybe a -> Either LndError b Source #

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 StM Maybe a 
Instance details

Defined in Control.Monad.Trans.Control

type StM Maybe a = 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 DemoteRep (Maybe a) 
Instance details

Defined in GHC.Generics

type DemoteRep (Maybe a) = Maybe (DemoteRep a)
type Element (Maybe a) 
Instance details

Defined in Universum.Container.Class

type Element (Maybe a) = ElementDefault (Maybe a)
type Rep1 Maybe

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

data Ordering #

Constructors

LT 
EQ 
GT 
Instances
Bounded Ordering

Since: base-2.1

Instance details

Defined in GHC.Enum

Enum Ordering

Since: base-2.1

Instance details

Defined in GHC.Enum

Eq Ordering 
Instance details

Defined in GHC.Classes

Ord Ordering 
Instance details

Defined in GHC.Classes

Read Ordering

Since: base-2.1

Instance details

Defined in GHC.Read

Show Ordering

Since: base-2.1

Instance details

Defined in GHC.Show

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 #

Semigroup Ordering

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Monoid Ordering

Since: base-2.1

Instance details

Defined in GHC.Base

NFData Ordering 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Ordering -> () #

FromJSON Ordering 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Ordering #

parseJSONList :: Value -> Parser [Ordering] #

Hashable Ordering 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Ordering -> Int #

hash :: Ordering -> Int

ToJSON Ordering 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Ordering -> Value

toEncoding :: Ordering -> Encoding

toJSONList :: [Ordering] -> Value

toEncodingList :: [Ordering] -> Encoding

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)))

data Ratio a #

Rational numbers, with numerator and denominator of some Integral type.

Note that Ratio's instances inherit the deficiencies from the type parameter's. For example, Ratio Natural's Num instance has similar problems to Natural's.

Constructors

!a :% !a 
Instances
NFData1 Ratio

Available on base >=4.9

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> Ratio a -> () #

PersistField Rational 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Rational -> PersistValue

fromPersistValue :: PersistValue -> Either Text Rational

PersistFieldSql Rational 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Rational -> SqlType

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] #

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 #

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 #

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 #

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 #

(Integral a, Read a) => Read (Ratio a)

Since: base-2.1

Instance details

Defined in GHC.Read

Integral a => Real (Ratio a)

Since: base-2.0.1

Instance details

Defined in GHC.Real

Methods

toRational :: Ratio a -> Rational #

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 #

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 #

Integral a => Lift (Ratio a) 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Ratio a -> Q Exp #

(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 () #

NFData a => NFData (Ratio a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Ratio a -> () #

(FromJSON a, Integral a) => FromJSON (Ratio a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Ratio a) #

parseJSONList :: Value -> Parser [Ratio a] #

Hashable a => Hashable (Ratio a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Ratio a -> Int #

hash :: Ratio a -> Int

(ToJSON a, Integral a) => ToJSON (Ratio a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Ratio a -> Value

toEncoding :: Ratio a -> Encoding

toJSONList :: [Ratio a] -> Value

toEncodingList :: [Ratio a] -> Encoding

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
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 #

fail :: String -> 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 #

MonadFail IO

Since: base-4.9.0.0

Instance details

Defined in Control.Monad.Fail

Methods

fail :: String -> 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 #

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] #

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 #

Quasi IO 
Instance details

Defined in Language.Haskell.TH.Syntax

PrimMonad IO 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState IO :: Type

Methods

primitive :: (State# (PrimState IO) -> (#State# (PrimState IO), a#)) -> IO a

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

MonadUnliftIO IO 
Instance details

Defined in Control.Monad.IO.Unlift

Methods

askUnliftIO :: IO (UnliftIO IO) #

withRunInIO :: ((forall a. IO a -> IO a) -> IO b) -> IO b #

PrimBase IO 
Instance details

Defined in Control.Monad.Primitive

Methods

internal :: IO a -> State# (PrimState IO) -> (#State# (PrimState IO), a#)

MonadRandom IO 
Instance details

Defined in Crypto.Random.Types

Methods

getRandomBytes :: ByteArray byteArray => Int -> IO byteArray

PrimMonad IO 
Instance details

Defined in Basement.Monad

Associated Types

type PrimState IO :: Type

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 ()

MonadError IOException IO 
Instance details

Defined in Control.Monad.Error.Class

Methods

throwError :: IOException -> IO a #

catchError :: IO a -> (IOException -> IO a) -> IO a #

MonadBaseControl IO IO 
Instance details

Defined in Control.Monad.Trans.Control

Associated Types

type StM IO a :: Type

Methods

liftBaseWith :: (RunInBase IO IO -> IO a) -> IO a

restoreM :: StM 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 #

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 #

type PrimState IO 
Instance details

Defined in Control.Monad.Primitive

type PrimState IO = RealWorld
type PrimState IO 
Instance details

Defined in Basement.Monad

type PrimState IO = RealWorld
type PrimVar IO 
Instance details

Defined in Basement.Monad

type PrimVar IO = IORef
type StM IO a 
Instance details

Defined in Control.Monad.Trans.Control

type StM IO a = a

data Word #

A Word is an unsigned integral type, with the same size as Int.

Instances
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] #

Eq Word 
Instance details

Defined in GHC.Classes

Methods

(==) :: Word -> Word -> Bool #

(/=) :: Word -> Word -> Bool #

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 #

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 #

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 #

Read Word

Since: base-4.5.0.0

Instance details

Defined in GHC.Read

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 #

Lift Word 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Word -> Q Exp #

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 () #

Bits Word

Since: base-2.1

Instance details

Defined in Data.Bits

FiniteBits Word

Since: base-4.6.0.0

Instance details

Defined in Data.Bits

NFData Word 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word -> () #

FromJSON Word 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Word #

parseJSONList :: Value -> Parser [Word] #

FromJSONKey Word 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction Word

fromJSONKeyList :: FromJSONKeyFunction [Word]

Hashable Word 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word -> Int #

hash :: Word -> Int

Prim Word 
Instance details

Defined in Data.Primitive.Types

ToJSON Word 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Word -> Value

toEncoding :: Word -> Encoding

toJSONList :: [Word] -> Value

toEncodingList :: [Word] -> Encoding

ToJSONKey Word 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction Word

toJSONKeyList :: ToJSONKeyFunction [Word]

Unbox Word 
Instance details

Defined in Data.Vector.Unboxed.Base

PersistField Word 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Word -> PersistValue

fromPersistValue :: PersistValue -> Either Text Word

PersistFieldSql Word 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Word -> SqlType

PrimType Word 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Word :: Nat

Methods

primSizeInBytes :: Proxy Word -> CountOf Word8

primShiftToBytes :: Proxy Word -> Int

primBaUIndex :: ByteArray# -> Offset Word -> Word

primMbaURead :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Word -> prim Word

primMbaUWrite :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Word -> Word -> prim ()

primAddrIndex :: Addr# -> Offset Word -> Word

primAddrRead :: PrimMonad prim => Addr# -> Offset Word -> prim Word

primAddrWrite :: PrimMonad prim => Addr# -> Offset Word -> Word -> prim ()

PrimMemoryComparable Word 
Instance details

Defined in Basement.PrimType

Subtractive Word 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Word :: Type

Methods

(-) :: Word -> Word -> Difference Word

MVector MVector Word 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s Word -> Int

basicUnsafeSlice :: Int -> Int -> MVector s Word -> MVector s Word

basicOverlaps :: MVector s Word -> MVector s Word -> Bool

basicUnsafeNew :: PrimMonad m => Int -> m (MVector (PrimState m) Word)

basicInitialize :: PrimMonad m => MVector (PrimState m) Word -> m ()

basicUnsafeReplicate :: PrimMonad m => Int -> Word -> m (MVector (PrimState m) Word)

basicUnsafeRead :: PrimMonad m => MVector (PrimState m) Word -> Int -> m Word

basicUnsafeWrite :: PrimMonad m => MVector (PrimState m) Word -> Int -> Word -> m ()

basicClear :: PrimMonad m => MVector (PrimState m) Word -> m ()

basicSet :: PrimMonad m => MVector (PrimState m) Word -> Word -> m ()

basicUnsafeCopy :: PrimMonad m => MVector (PrimState m) Word -> MVector (PrimState m) Word -> m ()

basicUnsafeMove :: PrimMonad m => MVector (PrimState m) Word -> MVector (PrimState m) Word -> m ()

basicUnsafeGrow :: PrimMonad m => MVector (PrimState m) Word -> Int -> m (MVector (PrimState m) Word)

Vector Vector Word 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: PrimMonad m => Mutable Vector (PrimState m) Word -> m (Vector Word)

basicUnsafeThaw :: PrimMonad m => Vector Word -> m (Mutable Vector (PrimState m) Word)

basicLength :: Vector Word -> Int

basicUnsafeSlice :: Int -> Int -> Vector Word -> Vector Word

basicUnsafeIndexM :: Monad m => Vector Word -> Int -> m Word

basicUnsafeCopy :: PrimMonad m => Mutable Vector (PrimState m) Word -> Vector Word -> m ()

elemseq :: Vector Word -> Word -> b -> b

Generic1 (URec Word :: k -> Type) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 (URec Word) :: k -> Type #

Methods

from1 :: URec Word a -> Rep1 (URec Word) a #

to1 :: Rep1 (URec Word) a -> URec Word a #

Functor (URec Word :: Type -> 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 #

Foldable (URec Word :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => URec Word m -> m #

foldMap :: Monoid m => (a -> m) -> URec Word a -> m #

foldr :: (a -> b -> b) -> b -> URec Word a -> b #

foldr' :: (a -> b -> b) -> b -> URec Word a -> b #

foldl :: (b -> a -> b) -> b -> URec Word a -> b #

foldl' :: (b -> a -> b) -> b -> URec Word a -> b #

foldr1 :: (a -> a -> a) -> URec Word a -> a #

foldl1 :: (a -> a -> a) -> URec Word a -> a #

toList :: URec Word a -> [a] #

null :: URec Word a -> Bool #

length :: URec Word a -> Int #

elem :: Eq a => a -> URec Word a -> Bool #

maximum :: Ord a => URec Word a -> a #

minimum :: Ord a => URec Word a -> a #

sum :: Num a => URec Word a -> a #

product :: Num a => URec Word a -> a #

Traversable (URec Word :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> URec Word a -> f (URec Word b) #

sequenceA :: Applicative f => URec Word (f a) -> f (URec Word a) #

mapM :: Monad m => (a -> m b) -> URec Word a -> m (URec Word b) #

sequence :: Monad m => URec Word (m a) -> m (URec Word a) #

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 #

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 #

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 #

newtype Vector Word 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector Word = V_Word (Vector Word)
type NatNumMaxBound Word 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Word = NatNumMaxBound Word64
type Difference Word 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Word = Word
type PrimSize Word 
Instance details

Defined in Basement.PrimType

type PrimSize Word = 8
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
Bounded Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Enum Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Eq Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Methods

(==) :: Word8 -> Word8 -> Bool #

(/=) :: Word8 -> Word8 -> Bool #

Integral Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Num Word8

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 #

Read Word8

Since: base-2.1

Instance details

Defined in GHC.Read

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 #

Ix Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Lift Word8 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Word8 -> Q Exp #

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

NFData Word8 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word8 -> () #

FromJSON Word8 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Word8 #

parseJSONList :: Value -> Parser [Word8] #

FromJSONKey Word8 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction Word8

fromJSONKeyList :: FromJSONKeyFunction [Word8]

Hashable Word8 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word8 -> Int #

hash :: Word8 -> Int

Prim Word8 
Instance details

Defined in Data.Primitive.Types

ToJSON Word8 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Word8 -> Value

toEncoding :: Word8 -> Encoding

toJSONList :: [Word8] -> Value

toEncodingList :: [Word8] -> Encoding

ToJSONKey Word8 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction Word8

toJSONKeyList :: ToJSONKeyFunction [Word8]

Unbox Word8 
Instance details

Defined in Data.Vector.Unboxed.Base

PersistField Word8 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Word8 -> PersistValue

fromPersistValue :: PersistValue -> Either Text Word8

PersistFieldSql Word8 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Word8 -> SqlType

ByteSource Word8 
Instance details

Defined in Data.UUID.Types.Internal.Builder

Methods

(/-/) :: ByteSink Word8 g -> Word8 -> g

TgaSaveable Pixel8 
Instance details

Defined in Codec.Picture.Tga

Methods

tgaDataOfImage :: Image Pixel8 -> ByteString

tgaPixelDepthOfImage :: Image Pixel8 -> Word8

tgaTypeOfImage :: Image Pixel8 -> TgaImageType

TiffSaveable Pixel8 
Instance details

Defined in Codec.Picture.Tiff

Methods

colorSpaceOfPixel :: Pixel8 -> TiffColorspace

extraSampleCodeOfPixel :: Pixel8 -> Maybe ExtraSample

subSamplingInfo :: Pixel8 -> Vector Word32

sampleFormat :: Pixel8 -> [TiffSampleFormat]

Pixel Pixel8 
Instance details

Defined in Codec.Picture.Types

Associated Types

type PixelBaseComponent Pixel8 :: Type

Methods

mixWith :: (Int -> PixelBaseComponent Pixel8 -> PixelBaseComponent Pixel8 -> PixelBaseComponent Pixel8) -> Pixel8 -> Pixel8 -> Pixel8

mixWithAlpha :: (Int -> PixelBaseComponent Pixel8 -> PixelBaseComponent Pixel8 -> PixelBaseComponent Pixel8) -> (PixelBaseComponent Pixel8 -> PixelBaseComponent Pixel8 -> PixelBaseComponent Pixel8) -> Pixel8 -> Pixel8 -> Pixel8

pixelOpacity :: Pixel8 -> PixelBaseComponent Pixel8

componentCount :: Pixel8 -> Int

colorMap :: (PixelBaseComponent Pixel8 -> PixelBaseComponent Pixel8) -> Pixel8 -> Pixel8

pixelBaseIndex :: Image Pixel8 -> Int -> Int -> Int

mutablePixelBaseIndex :: MutableImage s Pixel8 -> Int -> Int -> Int

pixelAt :: Image Pixel8 -> Int -> Int -> Pixel8

readPixel :: PrimMonad m => MutableImage (PrimState m) Pixel8 -> Int -> Int -> m Pixel8

writePixel :: PrimMonad m => MutableImage (PrimState m) Pixel8 -> Int -> Int -> Pixel8 -> m ()

unsafePixelAt :: Vector (PixelBaseComponent Pixel8) -> Int -> Pixel8

unsafeReadPixel :: PrimMonad m => STVector (PrimState m) (PixelBaseComponent Pixel8) -> Int -> m Pixel8

unsafeWritePixel :: PrimMonad m => STVector (PrimState m) (PixelBaseComponent Pixel8) -> Int -> Pixel8 -> m ()

Unpackable Word8 
Instance details

Defined in Codec.Picture.Tiff

Associated Types

type StorageType Word8 :: Type

Methods

outAlloc :: Word8 -> Int -> ST s (STVector s (StorageType Word8))

allocTempBuffer :: Word8 -> STVector s (StorageType Word8) -> Int -> ST s (STVector s Word8)

offsetStride :: Word8 -> Int -> Int -> (Int, Int)

mergeBackTempBuffer :: Word8 -> Endianness -> STVector s Word8 -> Int -> Int -> Word32 -> Int -> STVector s (StorageType Word8) -> ST s ()

LumaPlaneExtractable Pixel8 
Instance details

Defined in Codec.Picture.Types

Methods

computeLuma :: Pixel8 -> PixelBaseComponent Pixel8

extractLumaPlane :: Image Pixel8 -> Image (PixelBaseComponent Pixel8)

PackeablePixel Pixel8 
Instance details

Defined in Codec.Picture.Types

Associated Types

type PackedRepresentation Pixel8 :: Type

Methods

packPixel :: Pixel8 -> PackedRepresentation Pixel8

unpackPixel :: PackedRepresentation Pixel8 -> Pixel8

PrimType Word8 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Word8 :: Nat

Methods

primSizeInBytes :: Proxy Word8 -> CountOf Word8

primShiftToBytes :: Proxy Word8 -> Int

primBaUIndex :: ByteArray# -> Offset Word8 -> Word8

primMbaURead :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Word8 -> prim Word8

primMbaUWrite :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Word8 -> Word8 -> prim ()

primAddrIndex :: Addr# -> Offset Word8 -> Word8

primAddrRead :: PrimMonad prim => Addr# -> Offset Word8 -> prim Word8

primAddrWrite :: PrimMonad prim => Addr# -> Offset Word8 -> Word8 -> prim ()

PrimMemoryComparable Word8 
Instance details

Defined in Basement.PrimType

Subtractive Word8 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Word8 :: Type

Methods

(-) :: Word8 -> Word8 -> Difference Word8

MVector MVector Word8 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s Word8 -> Int

basicUnsafeSlice :: Int -> Int -> MVector s Word8 -> MVector s Word8

basicOverlaps :: MVector s Word8 -> MVector s Word8 -> Bool

basicUnsafeNew :: PrimMonad m => Int -> m (MVector (PrimState m) Word8)

basicInitialize :: PrimMonad m => MVector (PrimState m) Word8 -> m ()

basicUnsafeReplicate :: PrimMonad m => Int -> Word8 -> m (MVector (PrimState m) Word8)

basicUnsafeRead :: PrimMonad m => MVector (PrimState m) Word8 -> Int -> m Word8

basicUnsafeWrite :: PrimMonad m => MVector (PrimState m) Word8 -> Int -> Word8 -> m ()

basicClear :: PrimMonad m => MVector (PrimState m) Word8 -> m ()

basicSet :: PrimMonad m => MVector (PrimState m) Word8 -> Word8 -> m ()

basicUnsafeCopy :: PrimMonad m => MVector (PrimState m) Word8 -> MVector (PrimState m) Word8 -> m ()

basicUnsafeMove :: PrimMonad m => MVector (PrimState m) Word8 -> MVector (PrimState m) Word8 -> m ()

basicUnsafeGrow :: PrimMonad m => MVector (PrimState m) Word8 -> Int -> m (MVector (PrimState m) Word8)

Vector Vector Word8 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: PrimMonad m => Mutable Vector (PrimState m) Word8 -> m (Vector Word8)

basicUnsafeThaw :: PrimMonad m => Vector Word8 -> m (Mutable Vector (PrimState m) Word8)

basicLength :: Vector Word8 -> Int

basicUnsafeSlice :: Int -> Int -> Vector Word8 -> Vector Word8

basicUnsafeIndexM :: Monad m => Vector Word8 -> Int -> m Word8

basicUnsafeCopy :: PrimMonad m => Mutable Vector (PrimState m) Word8 -> Vector Word8 -> m ()

elemseq :: Vector Word8 -> Word8 -> b -> b

Decimable Pixel16 Pixel8 
Instance details

Defined in Codec.Picture

Methods

decimateBitDepth :: Image Pixel16 -> Image Pixel8

Decimable PixelF Pixel8 
Instance details

Defined in Codec.Picture

Methods

decimateBitDepth :: Image PixelF -> Image Pixel8

Decimable Pixel32 Pixel8 
Instance details

Defined in Codec.Picture

Methods

decimateBitDepth :: Image Pixel32 -> Image Pixel8

ColorConvertible Pixel8 Pixel16 
Instance details

Defined in Codec.Picture.Types

Methods

promotePixel :: Pixel8 -> Pixel16

promoteImage :: Image Pixel8 -> Image Pixel16

ColorConvertible Pixel8 PixelF 
Instance details

Defined in Codec.Picture.Types

Methods

promotePixel :: Pixel8 -> PixelF

promoteImage :: Image Pixel8 -> Image PixelF

ColorConvertible Pixel8 PixelRGB16 
Instance details

Defined in Codec.Picture.Types

Methods

promotePixel :: Pixel8 -> PixelRGB16

promoteImage :: Image Pixel8 -> Image PixelRGB16

ColorConvertible Pixel8 PixelRGB8 
Instance details

Defined in Codec.Picture.Types

Methods

promotePixel :: Pixel8 -> PixelRGB8

promoteImage :: Image Pixel8 -> Image PixelRGB8

ColorConvertible Pixel8 PixelRGBA8 
Instance details

Defined in Codec.Picture.Types

Methods

promotePixel :: Pixel8 -> PixelRGBA8

promoteImage :: Image Pixel8 -> Image PixelRGBA8

ColorConvertible Pixel8 PixelYA8 
Instance details

Defined in Codec.Picture.Types

Methods

promotePixel :: Pixel8 -> PixelYA8

promoteImage :: Image Pixel8 -> Image PixelYA8

TransparentPixel PixelYA8 Pixel8 
Instance details

Defined in Codec.Picture.Types

Methods

dropTransparency :: PixelYA8 -> Pixel8

getTransparency :: PixelYA8 -> PixelBaseComponent PixelYA8

ToBinary [Word8] 
Instance details

Defined in Codec.QRCode.Data.ToInput

Methods

toBinary :: [Word8] -> [Word8]

ToBinary (Vector Word8) 
Instance details

Defined in Codec.QRCode.Data.ToInput

Methods

toBinary :: Vector Word8 -> [Word8]

ToBinary (Vector Word8) 
Instance details

Defined in Codec.QRCode.Data.ToInput

Methods

toBinary :: Vector Word8 -> [Word8]

ToBinary (Vector Word8) 
Instance details

Defined in Codec.QRCode.Data.ToInput

Methods

toBinary :: Vector Word8 -> [Word8]

newtype Vector Word8 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector Word8 = V_Word8 (Vector Word8)
type PixelBaseComponent Pixel8 
Instance details

Defined in Codec.Picture.Types

type PixelBaseComponent Pixel8 = Word8
type StorageType Word8 
Instance details

Defined in Codec.Picture.Tiff

type StorageType Word8 = Word8
type PackedRepresentation Pixel8 
Instance details

Defined in Codec.Picture.Types

type PackedRepresentation Pixel8 = Pixel8
type NatNumMaxBound Word8 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Word8 = 255
type Difference Word8 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Word8 = Word8
type PrimSize Word8 
Instance details

Defined in Basement.PrimType

type PrimSize Word8 = 1
newtype MVector s Word8 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Word8 = MV_Word8 (MVector s Word8)
type ByteSink Word8 g 
Instance details

Defined in Data.UUID.Types.Internal.Builder

type ByteSink Word8 g = Takes1Byte g

data Word16 #

16-bit unsigned integer type

Instances
Bounded Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Enum Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Eq Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Methods

(==) :: Word16 -> Word16 -> Bool #

(/=) :: Word16 -> Word16 -> Bool #

Integral Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Num Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Ord Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Read Word16

Since: base-2.1

Instance details

Defined in GHC.Read

Real Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Show Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Ix Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Lift Word16 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Word16 -> Q Exp #

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

NFData Word16 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word16 -> () #

FromJSON Word16 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Word16 #

parseJSONList :: Value -> Parser [Word16] #

FromJSONKey Word16 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction Word16

fromJSONKeyList :: FromJSONKeyFunction [Word16]

Hashable Word16 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word16 -> Int #

hash :: Word16 -> Int

Prim Word16 
Instance details

Defined in Data.Primitive.Types

ToJSON Word16 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Word16 -> Value

toEncoding :: Word16 -> Encoding

toJSONList :: [Word16] -> Value

toEncodingList :: [Word16] -> Encoding

ToJSONKey Word16 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction Word16

toJSONKeyList :: ToJSONKeyFunction [Word16]

Unbox Word16 
Instance details

Defined in Data.Vector.Unboxed.Base

PersistField Word16 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Word16 -> PersistValue

fromPersistValue :: PersistValue -> Either Text Word16

PersistFieldSql Word16 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Word16 -> SqlType

ByteSource Word16 
Instance details

Defined in Data.UUID.Types.Internal.Builder

Methods

(/-/) :: ByteSink Word16 g -> Word16 -> g

TiffSaveable Pixel16 
Instance details

Defined in Codec.Picture.Tiff

Methods

colorSpaceOfPixel :: Pixel16 -> TiffColorspace

extraSampleCodeOfPixel :: Pixel16 -> Maybe ExtraSample

subSamplingInfo :: Pixel16 -> Vector Word32

sampleFormat :: Pixel16 -> [TiffSampleFormat]

Pixel Pixel16 
Instance details

Defined in Codec.Picture.Types

Associated Types

type PixelBaseComponent Pixel16 :: Type

Methods

mixWith :: (Int -> PixelBaseComponent Pixel16 -> PixelBaseComponent Pixel16 -> PixelBaseComponent Pixel16) -> Pixel16 -> Pixel16 -> Pixel16

mixWithAlpha :: (Int -> PixelBaseComponent Pixel16 -> PixelBaseComponent Pixel16 -> PixelBaseComponent Pixel16) -> (PixelBaseComponent Pixel16 -> PixelBaseComponent Pixel16 -> PixelBaseComponent Pixel16) -> Pixel16 -> Pixel16 -> Pixel16

pixelOpacity :: Pixel16 -> PixelBaseComponent Pixel16

componentCount :: Pixel16 -> Int

colorMap :: (PixelBaseComponent Pixel16 -> PixelBaseComponent Pixel16) -> Pixel16 -> Pixel16

pixelBaseIndex :: Image Pixel16 -> Int -> Int -> Int

mutablePixelBaseIndex :: MutableImage s Pixel16 -> Int -> Int -> Int

pixelAt :: Image Pixel16 -> Int -> Int -> Pixel16

readPixel :: PrimMonad m => MutableImage (PrimState m) Pixel16 -> Int -> Int -> m Pixel16

writePixel :: PrimMonad m => MutableImage (PrimState m) Pixel16 -> Int -> Int -> Pixel16 -> m ()

unsafePixelAt :: Vector (PixelBaseComponent Pixel16) -> Int -> Pixel16

unsafeReadPixel :: PrimMonad m => STVector (PrimState m) (PixelBaseComponent Pixel16) -> Int -> m Pixel16

unsafeWritePixel :: PrimMonad m => STVector (PrimState m) (PixelBaseComponent Pixel16) -> Int -> Pixel16 -> m ()

Unpackable Word16 
Instance details

Defined in Codec.Picture.Tiff

Associated Types

type StorageType Word16 :: Type

Methods

outAlloc :: Word16 -> Int -> ST s (STVector s (StorageType Word16))

allocTempBuffer :: Word16 -> STVector s (StorageType Word16) -> Int -> ST s (STVector s Word8)

offsetStride :: Word16 -> Int -> Int -> (Int, Int)

mergeBackTempBuffer :: Word16 -> Endianness -> STVector s Word8 -> Int -> Int -> Word32 -> Int -> STVector s (StorageType Word16) -> ST s ()

LumaPlaneExtractable Pixel16 
Instance details

Defined in Codec.Picture.Types

Methods

computeLuma :: Pixel16 -> PixelBaseComponent Pixel16

extractLumaPlane :: Image Pixel16 -> Image (PixelBaseComponent Pixel16)

PackeablePixel Pixel16 
Instance details

Defined in Codec.Picture.Types

Associated Types

type PackedRepresentation Pixel16 :: Type

Methods

packPixel :: Pixel16 -> PackedRepresentation Pixel16

unpackPixel :: PackedRepresentation Pixel16 -> Pixel16

PrimType Word16 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Word16 :: Nat

Methods

primSizeInBytes :: Proxy Word16 -> CountOf Word8

primShiftToBytes :: Proxy Word16 -> Int

primBaUIndex :: ByteArray# -> Offset Word16 -> Word16

primMbaURead :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Word16 -> prim Word16

primMbaUWrite :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Word16 -> Word16 -> prim ()

primAddrIndex :: Addr# -> Offset Word16 -> Word16

primAddrRead :: PrimMonad prim => Addr# -> Offset Word16 -> prim Word16

primAddrWrite :: PrimMonad prim => Addr# -> Offset Word16 -> Word16 -> prim ()

PrimMemoryComparable Word16 
Instance details

Defined in Basement.PrimType

Subtractive Word16 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Word16 :: Type

Methods

(-) :: Word16 -> Word16 -> Difference Word16

MVector MVector Word16 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s Word16 -> Int

basicUnsafeSlice :: Int -> Int -> MVector s Word16 -> MVector s Word16

basicOverlaps :: MVector s Word16 -> MVector s Word16 -> Bool

basicUnsafeNew :: PrimMonad m => Int -> m (MVector (PrimState m) Word16)

basicInitialize :: PrimMonad m => MVector (PrimState m) Word16 -> m ()

basicUnsafeReplicate :: PrimMonad m => Int -> Word16 -> m (MVector (PrimState m) Word16)

basicUnsafeRead :: PrimMonad m => MVector (PrimState m) Word16 -> Int -> m Word16

basicUnsafeWrite :: PrimMonad m => MVector (PrimState m) Word16 -> Int -> Word16 -> m ()

basicClear :: PrimMonad m => MVector (PrimState m) Word16 -> m ()

basicSet :: PrimMonad m => MVector (PrimState m) Word16 -> Word16 -> m ()

basicUnsafeCopy :: PrimMonad m => MVector (PrimState m) Word16 -> MVector (PrimState m) Word16 -> m ()

basicUnsafeMove :: PrimMonad m => MVector (PrimState m) Word16 -> MVector (PrimState m) Word16 -> m ()

basicUnsafeGrow :: PrimMonad m => MVector (PrimState m) Word16 -> Int -> m (MVector (PrimState m) Word16)

Vector Vector Word16 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: PrimMonad m => Mutable Vector (PrimState m) Word16 -> m (Vector Word16)

basicUnsafeThaw :: PrimMonad m => Vector Word16 -> m (Mutable Vector (PrimState m) Word16)

basicLength :: Vector Word16 -> Int

basicUnsafeSlice :: Int -> Int -> Vector Word16 -> Vector Word16

basicUnsafeIndexM :: Monad m => Vector Word16 -> Int -> m Word16

basicUnsafeCopy :: PrimMonad m => Mutable Vector (PrimState m) Word16 -> Vector Word16 -> m ()

elemseq :: Vector Word16 -> Word16 -> b -> b

Decimable Pixel16 Pixel8 
Instance details

Defined in Codec.Picture

Methods

decimateBitDepth :: Image Pixel16 -> Image Pixel8

Decimable PixelF Pixel16 
Instance details

Defined in Codec.Picture

Methods

decimateBitDepth :: Image PixelF -> Image Pixel16

Decimable Pixel32 Pixel16 
Instance details

Defined in Codec.Picture

Methods

decimateBitDepth :: Image Pixel32 -> Image Pixel16

ColorConvertible Pixel16 PixelRGB16 
Instance details

Defined in Codec.Picture.Types

Methods

promotePixel :: Pixel16 -> PixelRGB16

promoteImage :: Image Pixel16 -> Image PixelRGB16

ColorConvertible Pixel16 PixelRGBA16 
Instance details

Defined in Codec.Picture.Types

Methods

promotePixel :: Pixel16 -> PixelRGBA16

promoteImage :: Image Pixel16 -> Image PixelRGBA16

ColorConvertible Pixel16 PixelYA16 
Instance details

Defined in Codec.Picture.Types

Methods

promotePixel :: Pixel16 -> PixelYA16

promoteImage :: Image Pixel16 -> Image PixelYA16

ColorConvertible Pixel8 Pixel16 
Instance details

Defined in Codec.Picture.Types

Methods

promotePixel :: Pixel8 -> Pixel16

promoteImage :: Image Pixel8 -> Image Pixel16

TransparentPixel PixelYA16 Pixel16 
Instance details

Defined in Codec.Picture.Types

Methods

dropTransparency :: PixelYA16 -> Pixel16

getTransparency :: PixelYA16 -> PixelBaseComponent PixelYA16

newtype Vector Word16 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector Word16 = V_Word16 (Vector Word16)
type PixelBaseComponent Pixel16 
Instance details

Defined in Codec.Picture.Types

type PixelBaseComponent Pixel16 = Word16
type StorageType Word16 
Instance details

Defined in Codec.Picture.Tiff

type StorageType Word16 = Word16
type PackedRepresentation Pixel16 
Instance details

Defined in Codec.Picture.Types

type PackedRepresentation Pixel16 = Pixel16
type NatNumMaxBound Word16 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Word16 = 65535
type Difference Word16 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Word16 = Word16
type PrimSize Word16 
Instance details

Defined in Basement.PrimType

type PrimSize Word16 = 2
newtype MVector s Word16 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Word16 = MV_Word16 (MVector s Word16)
type ByteSink Word16 g 
Instance details

Defined in Data.UUID.Types.Internal.Builder

type ByteSink Word16 g = Takes2Bytes g

data Word32 #

32-bit unsigned integer type

Instances
Bounded Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Enum Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Eq Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Methods

(==) :: Word32 -> Word32 -> Bool #

(/=) :: Word32 -> Word32 -> Bool #

Integral Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Num Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Ord Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Read Word32

Since: base-2.1

Instance details

Defined in GHC.Read

Real Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Show Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Ix Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Lift Word32 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Word32 -> Q Exp #

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

NFData Word32 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word32 -> () #

FromJSON Word32 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Word32 #

parseJSONList :: Value -> Parser [Word32] #

FromJSONKey Word32 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction Word32

fromJSONKeyList :: FromJSONKeyFunction [Word32]

Hashable Word32 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word32 -> Int #

hash :: Word32 -> Int

Prim Word32 
Instance details

Defined in Data.Primitive.Types

ToJSON Word32 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Word32 -> Value

toEncoding :: Word32 -> Encoding

toJSONList :: [Word32] -> Value

toEncodingList :: [Word32] -> Encoding

ToJSONKey Word32 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction Word32

toJSONKeyList :: ToJSONKeyFunction [Word32]

Unbox Word32 
Instance details

Defined in Data.Vector.Unboxed.Base

PersistField Word32 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Word32 -> PersistValue

fromPersistValue :: PersistValue -> Either Text Word32

PersistFieldSql Word32 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Word32 -> SqlType

ByteSource Word32 
Instance details

Defined in Data.UUID.Types.Internal.Builder

Methods

(/-/) :: ByteSink Word32 g -> Word32 -> g

FieldDefault Word32 
Instance details

Defined in Data.ProtoLens.Message

TiffSaveable Pixel32 
Instance details

Defined in Codec.Picture.Tiff

Methods

colorSpaceOfPixel :: Pixel32 -> TiffColorspace

extraSampleCodeOfPixel :: Pixel32 -> Maybe ExtraSample

subSamplingInfo :: Pixel32 -> Vector Word32

sampleFormat :: Pixel32 -> [TiffSampleFormat]

Pixel Pixel32 
Instance details

Defined in Codec.Picture.Types

Associated Types

type PixelBaseComponent Pixel32 :: Type

Methods

mixWith :: (Int -> PixelBaseComponent Pixel32 -> PixelBaseComponent Pixel32 -> PixelBaseComponent Pixel32) -> Pixel32 -> Pixel32 -> Pixel32

mixWithAlpha :: (Int -> PixelBaseComponent Pixel32 -> PixelBaseComponent Pixel32 -> PixelBaseComponent Pixel32) -> (PixelBaseComponent Pixel32 -> PixelBaseComponent Pixel32 -> PixelBaseComponent Pixel32) -> Pixel32 -> Pixel32 -> Pixel32

pixelOpacity :: Pixel32 -> PixelBaseComponent Pixel32

componentCount :: Pixel32 -> Int

colorMap :: (PixelBaseComponent Pixel32 -> PixelBaseComponent Pixel32) -> Pixel32 -> Pixel32

pixelBaseIndex :: Image Pixel32 -> Int -> Int -> Int

mutablePixelBaseIndex :: MutableImage s Pixel32 -> Int -> Int -> Int

pixelAt :: Image Pixel32 -> Int -> Int -> Pixel32

readPixel :: PrimMonad m => MutableImage (PrimState m) Pixel32 -> Int -> Int -> m Pixel32

writePixel :: PrimMonad m => MutableImage (PrimState m) Pixel32 -> Int -> Int -> Pixel32 -> m ()

unsafePixelAt :: Vector (PixelBaseComponent Pixel32) -> Int -> Pixel32

unsafeReadPixel :: PrimMonad m => STVector (PrimState m) (PixelBaseComponent Pixel32) -> Int -> m Pixel32

unsafeWritePixel :: PrimMonad m => STVector (PrimState m) (PixelBaseComponent Pixel32) -> Int -> Pixel32 -> m ()

Unpackable Word32 
Instance details

Defined in Codec.Picture.Tiff

Associated Types

type StorageType Word32 :: Type

Methods

outAlloc :: Word32 -> Int -> ST s (STVector s (StorageType Word32))

allocTempBuffer :: Word32 -> STVector s (StorageType Word32) -> Int -> ST s (STVector s Word8)

offsetStride :: Word32 -> Int -> Int -> (Int, Int)

mergeBackTempBuffer :: Word32 -> Endianness -> STVector s Word8 -> Int -> Int -> Word32 -> Int -> STVector s (StorageType Word32) -> ST s ()

LumaPlaneExtractable Pixel32 
Instance details

Defined in Codec.Picture.Types

Methods

computeLuma :: Pixel32 -> PixelBaseComponent Pixel32

extractLumaPlane :: Image Pixel32 -> Image (PixelBaseComponent Pixel32)

PackeablePixel Pixel32 
Instance details

Defined in Codec.Picture.Types

Associated Types

type PackedRepresentation Pixel32 :: Type

Methods

packPixel :: Pixel32 -> PackedRepresentation Pixel32

unpackPixel :: PackedRepresentation Pixel32 -> Pixel32

PrimType Word32 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Word32 :: Nat

Methods

primSizeInBytes :: Proxy Word32 -> CountOf Word8

primShiftToBytes :: Proxy Word32 -> Int

primBaUIndex :: ByteArray# -> Offset Word32 -> Word32

primMbaURead :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Word32 -> prim Word32

primMbaUWrite :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Word32 -> Word32 -> prim ()

primAddrIndex :: Addr# -> Offset Word32 -> Word32

primAddrRead :: PrimMonad prim => Addr# -> Offset Word32 -> prim Word32

primAddrWrite :: PrimMonad prim => Addr# -> Offset Word32 -> Word32 -> prim ()

PrimMemoryComparable Word32 
Instance details

Defined in Basement.PrimType

Subtractive Word32 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Word32 :: Type

Methods

(-) :: Word32 -> Word32 -> Difference Word32

MVector MVector Word32 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s Word32 -> Int

basicUnsafeSlice :: Int -> Int -> MVector s Word32 -> MVector s Word32

basicOverlaps :: MVector s Word32 -> MVector s Word32 -> Bool

basicUnsafeNew :: PrimMonad m => Int -> m (MVector (PrimState m) Word32)

basicInitialize :: PrimMonad m => MVector (PrimState m) Word32 -> m ()

basicUnsafeReplicate :: PrimMonad m => Int -> Word32 -> m (MVector (PrimState m) Word32)

basicUnsafeRead :: PrimMonad m => MVector (PrimState m) Word32 -> Int -> m Word32

basicUnsafeWrite :: PrimMonad m => MVector (PrimState m) Word32 -> Int -> Word32 -> m ()

basicClear :: PrimMonad m => MVector (PrimState m) Word32 -> m ()

basicSet :: PrimMonad m => MVector (PrimState m) Word32 -> Word32 -> m ()

basicUnsafeCopy :: PrimMonad m => MVector (PrimState m) Word32 -> MVector (PrimState m) Word32 -> m ()

basicUnsafeMove :: PrimMonad m => MVector (PrimState m) Word32 -> MVector (PrimState m) Word32 -> m ()

basicUnsafeGrow :: PrimMonad m => MVector (PrimState m) Word32 -> Int -> m (MVector (PrimState m) Word32)

Vector Vector Word32 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: PrimMonad m => Mutable Vector (PrimState m) Word32 -> m (Vector Word32)

basicUnsafeThaw :: PrimMonad m => Vector Word32 -> m (Mutable Vector (PrimState m) Word32)

basicLength :: Vector Word32 -> Int

basicUnsafeSlice :: Int -> Int -> Vector Word32 -> Vector Word32

basicUnsafeIndexM :: Monad m => Vector Word32 -> Int -> m Word32

basicUnsafeCopy :: PrimMonad m => Mutable Vector (PrimState m) Word32 -> Vector Word32 -> m ()

elemseq :: Vector Word32 -> Word32 -> b -> b

Decimable Pixel32 Pixel16 
Instance details

Defined in Codec.Picture

Methods

decimateBitDepth :: Image Pixel32 -> Image Pixel16

Decimable Pixel32 Pixel8 
Instance details

Defined in Codec.Picture

Methods

decimateBitDepth :: Image Pixel32 -> Image Pixel8

HasField SendRequest "cltvLimit" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "cltvLimit" -> (Word32 -> f Word32) -> SendRequest -> f SendRequest

HasField RoutingPolicy "lastUpdate" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "lastUpdate" -> (Word32 -> f Word32) -> RoutingPolicy -> f RoutingPolicy

HasField RoutingPolicy "timeLockDelta" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "timeLockDelta" -> (Word32 -> f Word32) -> RoutingPolicy -> f RoutingPolicy

HasField Route "totalTimeLock" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "totalTimeLock" -> (Word32 -> f Word32) -> Route -> f Route

HasField QueryRoutesRequest "cltvLimit" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "cltvLimit" -> (Word32 -> f Word32) -> QueryRoutesRequest -> f QueryRoutesRequest

HasField PolicyUpdateRequest "timeLockDelta" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "timeLockDelta" -> (Word32 -> f Word32) -> PolicyUpdateRequest -> f PolicyUpdateRequest

HasField PendingUpdate "outputIndex" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "outputIndex" -> (Word32 -> f Word32) -> PendingUpdate -> f PendingUpdate

HasField PendingHTLC "maturityHeight" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maturityHeight" -> (Word32 -> f Word32) -> PendingHTLC -> f PendingHTLC

HasField PendingHTLC "stage" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "stage" -> (Word32 -> f Word32) -> PendingHTLC -> f PendingHTLC

HasField PendingChannelsResponse'PendingOpenChannel "confirmationHeight" Word32 
Instance details

Defined in Proto.LndGrpc

HasField PendingChannelsResponse'ForceClosedChannel "maturityHeight" Word32 
Instance details

Defined in Proto.LndGrpc

HasField Peer'FeaturesEntry "key" Word32 
Instance details

Defined in Proto.LndGrpc

HasField PayReq'FeaturesEntry "key" Word32 
Instance details

Defined in Proto.LndGrpc

HasField OutPoint "outputIndex" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "outputIndex" -> (Word32 -> f Word32) -> OutPoint -> f OutPoint

HasField OpenChannelRequest "maxLocalCsv" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maxLocalCsv" -> (Word32 -> f Word32) -> OpenChannelRequest -> f OpenChannelRequest

HasField OpenChannelRequest "remoteCsvDelay" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "remoteCsvDelay" -> (Word32 -> f Word32) -> OpenChannelRequest -> f OpenChannelRequest

HasField OpenChannelRequest "remoteMaxHtlcs" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "remoteMaxHtlcs" -> (Word32 -> f Word32) -> OpenChannelRequest -> f OpenChannelRequest

HasField NodeUpdate'FeaturesEntry "key" Word32 
Instance details

Defined in Proto.LndGrpc

HasField NodeInfo "numChannels" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "numChannels" -> (Word32 -> f Word32) -> NodeInfo -> f NodeInfo

HasField NetworkInfo "graphDiameter" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "graphDiameter" -> (Word32 -> f Word32) -> NetworkInfo -> f NetworkInfo

HasField NetworkInfo "maxOutDegree" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maxOutDegree" -> (Word32 -> f Word32) -> NetworkInfo -> f NetworkInfo

HasField NetworkInfo "numChannels" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "numChannels" -> (Word32 -> f Word32) -> NetworkInfo -> f NetworkInfo

HasField NetworkInfo "numNodes" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "numNodes" -> (Word32 -> f Word32) -> NetworkInfo -> f NetworkInfo

HasField LightningNode'FeaturesEntry "key" Word32 
Instance details

Defined in Proto.LndGrpc

HasField LightningNode "lastUpdate" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "lastUpdate" -> (Word32 -> f Word32) -> LightningNode -> f LightningNode

HasField Invoice'FeaturesEntry "key" Word32 
Instance details

Defined in Proto.LndGrpc

HasField HopHint "cltvExpiryDelta" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "cltvExpiryDelta" -> (Word32 -> f Word32) -> HopHint -> f HopHint

HasField HopHint "feeBaseMsat" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "feeBaseMsat" -> (Word32 -> f Word32) -> HopHint -> f HopHint

HasField HopHint "feeProportionalMillionths" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "feeProportionalMillionths" -> (Word32 -> f Word32) -> HopHint -> f HopHint

HasField Hop "expiry" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "expiry" -> (Word32 -> f Word32) -> Hop -> f Hop

HasField HTLC "expirationHeight" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "expirationHeight" -> (Word32 -> f Word32) -> HTLC -> f HTLC

HasField GetInfoResponse'FeaturesEntry "key" Word32 
Instance details

Defined in Proto.LndGrpc

HasField GetInfoResponse "blockHeight" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "blockHeight" -> (Word32 -> f Word32) -> GetInfoResponse -> f GetInfoResponse

HasField GetInfoResponse "numActiveChannels" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "numActiveChannels" -> (Word32 -> f Word32) -> GetInfoResponse -> f GetInfoResponse

HasField GetInfoResponse "numInactiveChannels" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "numInactiveChannels" -> (Word32 -> f Word32) -> GetInfoResponse -> f GetInfoResponse

HasField GetInfoResponse "numPeers" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "numPeers" -> (Word32 -> f Word32) -> GetInfoResponse -> f GetInfoResponse

HasField GetInfoResponse "numPendingChannels" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "numPendingChannels" -> (Word32 -> f Word32) -> GetInfoResponse -> f GetInfoResponse

HasField ForwardingHistoryResponse "lastOffsetIndex" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "lastOffsetIndex" -> (Word32 -> f Word32) -> ForwardingHistoryResponse -> f ForwardingHistoryResponse

HasField ForwardingHistoryRequest "indexOffset" Word32 
Instance details

Defined in Proto.LndGrpc

HasField ForwardingHistoryRequest "numMaxEvents" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "numMaxEvents" -> (Word32 -> f Word32) -> ForwardingHistoryRequest -> f ForwardingHistoryRequest

HasField Failure "cltvExpiry" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "cltvExpiry" -> (Word32 -> f Word32) -> Failure -> f Failure

HasField Failure "failureSourceIndex" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "failureSourceIndex" -> (Word32 -> f Word32) -> Failure -> f Failure

HasField Failure "flags" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "flags" -> (Word32 -> f Word32) -> Failure -> f Failure

HasField Failure "height" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "height" -> (Word32 -> f Word32) -> Failure -> f Failure

HasField ConfirmationUpdate "numConfsLeft" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "numConfsLeft" -> (Word32 -> f Word32) -> ConfirmationUpdate -> f ConfirmationUpdate

HasField ClosedChannelUpdate "closedHeight" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "closedHeight" -> (Word32 -> f Word32) -> ClosedChannelUpdate -> f ClosedChannelUpdate

HasField ChannelUpdate "baseFee" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "baseFee" -> (Word32 -> f Word32) -> ChannelUpdate -> f ChannelUpdate

HasField ChannelUpdate "channelFlags" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "channelFlags" -> (Word32 -> f Word32) -> ChannelUpdate -> f ChannelUpdate

HasField ChannelUpdate "feeRate" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "feeRate" -> (Word32 -> f Word32) -> ChannelUpdate -> f ChannelUpdate

HasField ChannelUpdate "messageFlags" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "messageFlags" -> (Word32 -> f Word32) -> ChannelUpdate -> f ChannelUpdate

HasField ChannelUpdate "timeLockDelta" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "timeLockDelta" -> (Word32 -> f Word32) -> ChannelUpdate -> f ChannelUpdate

HasField ChannelUpdate "timestamp" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "timestamp" -> (Word32 -> f Word32) -> ChannelUpdate -> f ChannelUpdate

HasField ChannelPoint "outputIndex" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "outputIndex" -> (Word32 -> f Word32) -> ChannelPoint -> f ChannelPoint

HasField ChannelEdge "lastUpdate" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "lastUpdate" -> (Word32 -> f Word32) -> ChannelEdge -> f ChannelEdge

HasField ChannelConstraints "csvDelay" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "csvDelay" -> (Word32 -> f Word32) -> ChannelConstraints -> f ChannelConstraints

HasField ChannelConstraints "maxAcceptedHtlcs" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maxAcceptedHtlcs" -> (Word32 -> f Word32) -> ChannelConstraints -> f ChannelConstraints

HasField ChannelCloseSummary "closeHeight" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "closeHeight" -> (Word32 -> f Word32) -> ChannelCloseSummary -> f ChannelCloseSummary

HasField ChannelAcceptResponse "csvDelay" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "csvDelay" -> (Word32 -> f Word32) -> ChannelAcceptResponse -> f ChannelAcceptResponse

HasField ChannelAcceptResponse "maxHtlcCount" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maxHtlcCount" -> (Word32 -> f Word32) -> ChannelAcceptResponse -> f ChannelAcceptResponse

HasField ChannelAcceptResponse "minAcceptDepth" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "minAcceptDepth" -> (Word32 -> f Word32) -> ChannelAcceptResponse -> f ChannelAcceptResponse

HasField ChannelAcceptRequest "channelFlags" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "channelFlags" -> (Word32 -> f Word32) -> ChannelAcceptRequest -> f ChannelAcceptRequest

HasField ChannelAcceptRequest "csvDelay" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "csvDelay" -> (Word32 -> f Word32) -> ChannelAcceptRequest -> f ChannelAcceptRequest

HasField ChannelAcceptRequest "maxAcceptedHtlcs" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maxAcceptedHtlcs" -> (Word32 -> f Word32) -> ChannelAcceptRequest -> f ChannelAcceptRequest

HasField Channel "csvDelay" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "csvDelay" -> (Word32 -> f Word32) -> Channel -> f Channel

HasField Channel "thawHeight" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "thawHeight" -> (Word32 -> f Word32) -> Channel -> f Channel

HasField ChanPointShim "thawHeight" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "thawHeight" -> (Word32 -> f Word32) -> ChanPointShim -> f ChanPointShim

HasField AMPRecord "childIndex" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "childIndex" -> (Word32 -> f Word32) -> AMPRecord -> f AMPRecord

HasField AMP "childIndex" Word32 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "childIndex" -> (Word32 -> f Word32) -> AMP -> f AMP

HasField SendPaymentRequest "maxParts" Word32 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "maxParts" -> (Word32 -> f Word32) -> SendPaymentRequest -> f SendPaymentRequest

HasField MissionControlConfig "maximumPaymentResults" Word32 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "maximumPaymentResults" -> (Word32 -> f Word32) -> MissionControlConfig -> f MissionControlConfig

HasField HtlcInfo "incomingTimelock" Word32 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "incomingTimelock" -> (Word32 -> f Word32) -> HtlcInfo -> f HtlcInfo

HasField HtlcInfo "outgoingTimelock" Word32 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "outgoingTimelock" -> (Word32 -> f Word32) -> HtlcInfo -> f HtlcInfo

HasField ForwardHtlcInterceptRequest "incomingExpiry" Word32 
Instance details

Defined in Proto.RouterGrpc

HasField ForwardHtlcInterceptRequest "outgoingExpiry" Word32 
Instance details

Defined in Proto.RouterGrpc

HasField Peer "features" (Map Word32 Feature) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "features" -> (Map Word32 Feature -> f (Map Word32 Feature)) -> Peer -> f Peer

HasField PayReq "features" (Map Word32 Feature) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "features" -> (Map Word32 Feature -> f (Map Word32 Feature)) -> PayReq -> f PayReq

HasField NodeUpdate "features" (Map Word32 Feature) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "features" -> (Map Word32 Feature -> f (Map Word32 Feature)) -> NodeUpdate -> f NodeUpdate

HasField LightningNode "features" (Map Word32 Feature) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "features" -> (Map Word32 Feature -> f (Map Word32 Feature)) -> LightningNode -> f LightningNode

HasField Invoice "features" (Map Word32 Feature) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "features" -> (Map Word32 Feature -> f (Map Word32 Feature)) -> Invoice -> f Invoice

HasField GetInfoResponse "features" (Map Word32 Feature) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "features" -> (Map Word32 Feature -> f (Map Word32 Feature)) -> GetInfoResponse -> f GetInfoResponse

FromGrpc (Vout a) Word32 Source # 
Instance details

Defined in LndClient.Data.Newtype

ToGrpc (Vout a) Word32 Source # 
Instance details

Defined in LndClient.Data.Newtype

newtype Vector Word32 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector Word32 = V_Word32 (Vector Word32)
type PixelBaseComponent Pixel32 
Instance details

Defined in Codec.Picture.Types

type PixelBaseComponent Pixel32 = Word32
type StorageType Word32 
Instance details

Defined in Codec.Picture.Tiff

type StorageType Word32 = Word32
type PackedRepresentation Pixel32 
Instance details

Defined in Codec.Picture.Types

type PackedRepresentation Pixel32 = Pixel32
type NatNumMaxBound Word32 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Word32 = 4294967295
type Difference Word32 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Word32 = Word32
type PrimSize Word32 
Instance details

Defined in Basement.PrimType

type PrimSize Word32 = 4
newtype MVector s Word32 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Word32 = MV_Word32 (MVector s Word32)
type ByteSink Word32 g 
Instance details

Defined in Data.UUID.Types.Internal.Builder

type ByteSink Word32 g = Takes4Bytes g

data Word64 #

64-bit unsigned integer type

Instances
Bounded Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Enum Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Eq Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Methods

(==) :: Word64 -> Word64 -> Bool #

(/=) :: Word64 -> Word64 -> Bool #

Integral Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Num Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Ord Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Read Word64

Since: base-2.1

Instance details

Defined in GHC.Read

Real Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Show Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Ix Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Lift Word64 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Word64 -> Q Exp #

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

NFData Word64 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word64 -> () #

FromJSON Word64 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Word64 #

parseJSONList :: Value -> Parser [Word64] #

FromJSONKey Word64 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction Word64

fromJSONKeyList :: FromJSONKeyFunction [Word64]

Hashable Word64 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word64 -> Int #

hash :: Word64 -> Int

Prim Word64 
Instance details

Defined in Data.Primitive.Types

ToJSON Word64 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Word64 -> Value

toEncoding :: Word64 -> Encoding

toJSONList :: [Word64] -> Value

toEncodingList :: [Word64] -> Encoding

ToJSONKey Word64 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction Word64

toJSONKeyList :: ToJSONKeyFunction [Word64]

Unbox Word64 
Instance details

Defined in Data.Vector.Unboxed.Base

PersistField Word64 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Word64 -> PersistValue

fromPersistValue :: PersistValue -> Either Text Word64

PersistFieldSql Word64 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Word64 -> SqlType

FieldDefault Word64 
Instance details

Defined in Data.ProtoLens.Message

PrimType Word64 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Word64 :: Nat

Methods

primSizeInBytes :: Proxy Word64 -> CountOf Word8

primShiftToBytes :: Proxy Word64 -> Int

primBaUIndex :: ByteArray# -> Offset Word64 -> Word64

primMbaURead :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Word64 -> prim Word64

primMbaUWrite :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Word64 -> Word64 -> prim ()

primAddrIndex :: Addr# -> Offset Word64 -> Word64

primAddrRead :: PrimMonad prim => Addr# -> Offset Word64 -> prim Word64

primAddrWrite :: PrimMonad prim => Addr# -> Offset Word64 -> Word64 -> prim ()

PrimMemoryComparable Word64 
Instance details

Defined in Basement.PrimType

Subtractive Word64 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Word64 :: Type

Methods

(-) :: Word64 -> Word64 -> Difference Word64

MVector MVector Word64 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s Word64 -> Int

basicUnsafeSlice :: Int -> Int -> MVector s Word64 -> MVector s Word64

basicOverlaps :: MVector s Word64 -> MVector s Word64 -> Bool

basicUnsafeNew :: PrimMonad m => Int -> m (MVector (PrimState m) Word64)

basicInitialize :: PrimMonad m => MVector (PrimState m) Word64 -> m ()

basicUnsafeReplicate :: PrimMonad m => Int -> Word64 -> m (MVector (PrimState m) Word64)

basicUnsafeRead :: PrimMonad m => MVector (PrimState m) Word64 -> Int -> m Word64

basicUnsafeWrite :: PrimMonad m => MVector (PrimState m) Word64 -> Int -> Word64 -> m ()

basicClear :: PrimMonad m => MVector (PrimState m) Word64 -> m ()

basicSet :: PrimMonad m => MVector (PrimState m) Word64 -> Word64 -> m ()

basicUnsafeCopy :: PrimMonad m => MVector (PrimState m) Word64 -> MVector (PrimState m) Word64 -> m ()

basicUnsafeMove :: PrimMonad m => MVector (PrimState m) Word64 -> MVector (PrimState m) Word64 -> m ()

basicUnsafeGrow :: PrimMonad m => MVector (PrimState m) Word64 -> Int -> m (MVector (PrimState m) Word64)

Vector Vector Word64 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: PrimMonad m => Mutable Vector (PrimState m) Word64 -> m (Vector Word64)

basicUnsafeThaw :: PrimMonad m => Vector Word64 -> m (Mutable Vector (PrimState m) Word64)

basicLength :: Vector Word64 -> Int

basicUnsafeSlice :: Int -> Int -> Vector Word64 -> Vector Word64

basicUnsafeIndexM :: Monad m => Vector Word64 -> Int -> m Word64

basicUnsafeCopy :: PrimMonad m => Mutable Vector (PrimState m) Word64 -> Vector Word64 -> m ()

elemseq :: Vector Word64 -> Word64 -> b -> b

FromGrpc MSat Word64 Source # 
Instance details

Defined in LndClient.Data.Newtype

FromGrpc SettleIndex Word64 Source # 
Instance details

Defined in LndClient.Data.Newtype

FromGrpc AddIndex Word64 Source # 
Instance details

Defined in LndClient.Data.Newtype

ToGrpc SettleIndex Word64 Source # 
Instance details

Defined in LndClient.Data.Newtype

ToGrpc AddIndex Word64 Source # 
Instance details

Defined in LndClient.Data.Newtype

HasField TimestampedError "timestamp" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "timestamp" -> (Word64 -> f Word64) -> TimestampedError -> f TimestampedError

HasField SendRequest'DestCustomRecordsEntry "key" Word64 
Instance details

Defined in Proto.LndGrpc

HasField SendRequest "outgoingChanId" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "outgoingChanId" -> (Word64 -> f Word64) -> SendRequest -> f SendRequest

HasField SendManyRequest "satPerVbyte" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "satPerVbyte" -> (Word64 -> f Word64) -> SendManyRequest -> f SendManyRequest

HasField SendCoinsRequest "satPerVbyte" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "satPerVbyte" -> (Word64 -> f Word64) -> SendCoinsRequest -> f SendCoinsRequest

HasField RoutingPolicy "maxHtlcMsat" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maxHtlcMsat" -> (Word64 -> f Word64) -> RoutingPolicy -> f RoutingPolicy

HasField Resolution "amountSat" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "amountSat" -> (Word64 -> f Word64) -> Resolution -> f Resolution

HasField QueryRoutesRequest'DestCustomRecordsEntry "key" Word64 
Instance details

Defined in Proto.LndGrpc

HasField QueryRoutesRequest "outgoingChanId" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "outgoingChanId" -> (Word64 -> f Word64) -> QueryRoutesRequest -> f QueryRoutesRequest

HasField PolicyUpdateRequest "maxHtlcMsat" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maxHtlcMsat" -> (Word64 -> f Word64) -> PolicyUpdateRequest -> f PolicyUpdateRequest

HasField PolicyUpdateRequest "minHtlcMsat" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "minHtlcMsat" -> (Word64 -> f Word64) -> PolicyUpdateRequest -> f PolicyUpdateRequest

HasField PendingChannelsResponse'Commitments "localCommitFeeSat" Word64 
Instance details

Defined in Proto.LndGrpc

HasField PendingChannelsResponse'Commitments "remoteCommitFeeSat" Word64 
Instance details

Defined in Proto.LndGrpc

HasField PendingChannelsResponse'Commitments "remotePendingCommitFeeSat" Word64 
Instance details

Defined in Proto.LndGrpc

HasField Peer "bytesRecv" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "bytesRecv" -> (Word64 -> f Word64) -> Peer -> f Peer

HasField Peer "bytesSent" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "bytesSent" -> (Word64 -> f Word64) -> Peer -> f Peer

HasField Payment "paymentIndex" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "paymentIndex" -> (Word64 -> f Word64) -> Payment -> f Payment

HasField OpenChannelRequest "remoteMaxValueInFlightMsat" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "remoteMaxValueInFlightMsat" -> (Word64 -> f Word64) -> OpenChannelRequest -> f OpenChannelRequest

HasField OpenChannelRequest "satPerVbyte" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "satPerVbyte" -> (Word64 -> f Word64) -> OpenChannelRequest -> f OpenChannelRequest

HasField NetworkInfo "numZombieChans" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "numZombieChans" -> (Word64 -> f Word64) -> NetworkInfo -> f NetworkInfo

HasField ListPaymentsResponse "firstIndexOffset" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "firstIndexOffset" -> (Word64 -> f Word64) -> ListPaymentsResponse -> f ListPaymentsResponse

HasField ListPaymentsResponse "lastIndexOffset" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "lastIndexOffset" -> (Word64 -> f Word64) -> ListPaymentsResponse -> f ListPaymentsResponse

HasField ListPaymentsRequest "indexOffset" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "indexOffset" -> (Word64 -> f Word64) -> ListPaymentsRequest -> f ListPaymentsRequest

HasField ListPaymentsRequest "maxPayments" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maxPayments" -> (Word64 -> f Word64) -> ListPaymentsRequest -> f ListPaymentsRequest

HasField ListInvoiceResponse "firstIndexOffset" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "firstIndexOffset" -> (Word64 -> f Word64) -> ListInvoiceResponse -> f ListInvoiceResponse

HasField ListInvoiceResponse "lastIndexOffset" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "lastIndexOffset" -> (Word64 -> f Word64) -> ListInvoiceResponse -> f ListInvoiceResponse

HasField ListInvoiceRequest "indexOffset" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "indexOffset" -> (Word64 -> f Word64) -> ListInvoiceRequest -> f ListInvoiceRequest

HasField ListInvoiceRequest "numMaxInvoices" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "numMaxInvoices" -> (Word64 -> f Word64) -> ListInvoiceRequest -> f ListInvoiceRequest

HasField InvoiceSubscription "addIndex" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "addIndex" -> (Word64 -> f Word64) -> InvoiceSubscription -> f InvoiceSubscription

HasField InvoiceSubscription "settleIndex" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "settleIndex" -> (Word64 -> f Word64) -> InvoiceSubscription -> f InvoiceSubscription

HasField InvoiceHTLC'CustomRecordsEntry "key" Word64 
Instance details

Defined in Proto.LndGrpc

HasField InvoiceHTLC "amtMsat" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "amtMsat" -> (Word64 -> f Word64) -> InvoiceHTLC -> f InvoiceHTLC

HasField InvoiceHTLC "chanId" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "chanId" -> (Word64 -> f Word64) -> InvoiceHTLC -> f InvoiceHTLC

HasField InvoiceHTLC "htlcIndex" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "htlcIndex" -> (Word64 -> f Word64) -> InvoiceHTLC -> f InvoiceHTLC

HasField InvoiceHTLC "mppTotalAmtMsat" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "mppTotalAmtMsat" -> (Word64 -> f Word64) -> InvoiceHTLC -> f InvoiceHTLC

HasField Invoice "addIndex" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "addIndex" -> (Word64 -> f Word64) -> Invoice -> f Invoice

HasField Invoice "cltvExpiry" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "cltvExpiry" -> (Word64 -> f Word64) -> Invoice -> f Invoice

HasField Invoice "settleIndex" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "settleIndex" -> (Word64 -> f Word64) -> Invoice -> f Invoice

HasField HopHint "chanId" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "chanId" -> (Word64 -> f Word64) -> HopHint -> f HopHint

HasField Hop'CustomRecordsEntry "key" Word64 
Instance details

Defined in Proto.LndGrpc

HasField Hop "chanId" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "chanId" -> (Word64 -> f Word64) -> Hop -> f Hop

HasField HTLCAttempt "attemptId" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "attemptId" -> (Word64 -> f Word64) -> HTLCAttempt -> f HTLCAttempt

HasField HTLC "forwardingChannel" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "forwardingChannel" -> (Word64 -> f Word64) -> HTLC -> f HTLC

HasField HTLC "forwardingHtlcIndex" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "forwardingHtlcIndex" -> (Word64 -> f Word64) -> HTLC -> f HTLC

HasField HTLC "htlcIndex" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "htlcIndex" -> (Word64 -> f Word64) -> HTLC -> f HTLC

HasField ForwardingHistoryRequest "endTime" Word64 
Instance details

Defined in Proto.LndGrpc

HasField ForwardingHistoryRequest "startTime" Word64 
Instance details

Defined in Proto.LndGrpc

HasField ForwardingEvent "amtIn" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "amtIn" -> (Word64 -> f Word64) -> ForwardingEvent -> f ForwardingEvent

HasField ForwardingEvent "amtInMsat" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "amtInMsat" -> (Word64 -> f Word64) -> ForwardingEvent -> f ForwardingEvent

HasField ForwardingEvent "amtOut" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "amtOut" -> (Word64 -> f Word64) -> ForwardingEvent -> f ForwardingEvent

HasField ForwardingEvent "amtOutMsat" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "amtOutMsat" -> (Word64 -> f Word64) -> ForwardingEvent -> f ForwardingEvent

HasField ForwardingEvent "chanIdIn" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "chanIdIn" -> (Word64 -> f Word64) -> ForwardingEvent -> f ForwardingEvent

HasField ForwardingEvent "chanIdOut" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "chanIdOut" -> (Word64 -> f Word64) -> ForwardingEvent -> f ForwardingEvent

HasField ForwardingEvent "fee" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "fee" -> (Word64 -> f Word64) -> ForwardingEvent -> f ForwardingEvent

HasField ForwardingEvent "feeMsat" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "feeMsat" -> (Word64 -> f Word64) -> ForwardingEvent -> f ForwardingEvent

HasField ForwardingEvent "timestamp" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "timestamp" -> (Word64 -> f Word64) -> ForwardingEvent -> f ForwardingEvent

HasField ForwardingEvent "timestampNs" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "timestampNs" -> (Word64 -> f Word64) -> ForwardingEvent -> f ForwardingEvent

HasField FeeReportResponse "dayFeeSum" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "dayFeeSum" -> (Word64 -> f Word64) -> FeeReportResponse -> f FeeReportResponse

HasField FeeReportResponse "monthFeeSum" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "monthFeeSum" -> (Word64 -> f Word64) -> FeeReportResponse -> f FeeReportResponse

HasField FeeReportResponse "weekFeeSum" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "weekFeeSum" -> (Word64 -> f Word64) -> FeeReportResponse -> f FeeReportResponse

HasField Failure "htlcMsat" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "htlcMsat" -> (Word64 -> f Word64) -> Failure -> f Failure

HasField EstimateFeeResponse "satPerVbyte" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "satPerVbyte" -> (Word64 -> f Word64) -> EstimateFeeResponse -> f EstimateFeeResponse

HasField EdgeLocator "channelId" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "channelId" -> (Word64 -> f Word64) -> EdgeLocator -> f EdgeLocator

HasField DeleteMacaroonIDRequest "rootKeyId" Word64 
Instance details

Defined in Proto.LndGrpc

HasField ConnectPeerRequest "timeout" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "timeout" -> (Word64 -> f Word64) -> ConnectPeerRequest -> f ConnectPeerRequest

HasField ClosedChannelUpdate "chanId" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "chanId" -> (Word64 -> f Word64) -> ClosedChannelUpdate -> f ClosedChannelUpdate

HasField CloseChannelRequest "satPerVbyte" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "satPerVbyte" -> (Word64 -> f Word64) -> CloseChannelRequest -> f CloseChannelRequest

HasField ChannelUpdate "chanId" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "chanId" -> (Word64 -> f Word64) -> ChannelUpdate -> f ChannelUpdate

HasField ChannelUpdate "htlcMaximumMsat" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "htlcMaximumMsat" -> (Word64 -> f Word64) -> ChannelUpdate -> f ChannelUpdate

HasField ChannelUpdate "htlcMinimumMsat" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "htlcMinimumMsat" -> (Word64 -> f Word64) -> ChannelUpdate -> f ChannelUpdate

HasField ChannelFeeReport "chanId" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "chanId" -> (Word64 -> f Word64) -> ChannelFeeReport -> f ChannelFeeReport

HasField ChannelEdgeUpdate "chanId" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "chanId" -> (Word64 -> f Word64) -> ChannelEdgeUpdate -> f ChannelEdgeUpdate

HasField ChannelEdge "channelId" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "channelId" -> (Word64 -> f Word64) -> ChannelEdge -> f ChannelEdge

HasField ChannelConstraints "chanReserveSat" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "chanReserveSat" -> (Word64 -> f Word64) -> ChannelConstraints -> f ChannelConstraints

HasField ChannelConstraints "dustLimitSat" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "dustLimitSat" -> (Word64 -> f Word64) -> ChannelConstraints -> f ChannelConstraints

HasField ChannelConstraints "maxPendingAmtMsat" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maxPendingAmtMsat" -> (Word64 -> f Word64) -> ChannelConstraints -> f ChannelConstraints

HasField ChannelConstraints "minHtlcMsat" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "minHtlcMsat" -> (Word64 -> f Word64) -> ChannelConstraints -> f ChannelConstraints

HasField ChannelCloseSummary "chanId" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "chanId" -> (Word64 -> f Word64) -> ChannelCloseSummary -> f ChannelCloseSummary

HasField ChannelAcceptResponse "inFlightMaxMsat" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "inFlightMaxMsat" -> (Word64 -> f Word64) -> ChannelAcceptResponse -> f ChannelAcceptResponse

HasField ChannelAcceptResponse "minHtlcIn" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "minHtlcIn" -> (Word64 -> f Word64) -> ChannelAcceptResponse -> f ChannelAcceptResponse

HasField ChannelAcceptResponse "reserveSat" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "reserveSat" -> (Word64 -> f Word64) -> ChannelAcceptResponse -> f ChannelAcceptResponse

HasField ChannelAcceptRequest "channelReserve" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "channelReserve" -> (Word64 -> f Word64) -> ChannelAcceptRequest -> f ChannelAcceptRequest

HasField ChannelAcceptRequest "dustLimit" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "dustLimit" -> (Word64 -> f Word64) -> ChannelAcceptRequest -> f ChannelAcceptRequest

HasField ChannelAcceptRequest "feePerKw" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "feePerKw" -> (Word64 -> f Word64) -> ChannelAcceptRequest -> f ChannelAcceptRequest

HasField ChannelAcceptRequest "fundingAmt" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "fundingAmt" -> (Word64 -> f Word64) -> ChannelAcceptRequest -> f ChannelAcceptRequest

HasField ChannelAcceptRequest "maxValueInFlight" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maxValueInFlight" -> (Word64 -> f Word64) -> ChannelAcceptRequest -> f ChannelAcceptRequest

HasField ChannelAcceptRequest "minHtlc" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "minHtlc" -> (Word64 -> f Word64) -> ChannelAcceptRequest -> f ChannelAcceptRequest

HasField ChannelAcceptRequest "pushAmt" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "pushAmt" -> (Word64 -> f Word64) -> ChannelAcceptRequest -> f ChannelAcceptRequest

HasField Channel "chanId" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "chanId" -> (Word64 -> f Word64) -> Channel -> f Channel

HasField Channel "numUpdates" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "numUpdates" -> (Word64 -> f Word64) -> Channel -> f Channel

HasField Channel "pushAmountSat" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "pushAmountSat" -> (Word64 -> f Word64) -> Channel -> f Channel

HasField ChanInfoRequest "chanId" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "chanId" -> (Word64 -> f Word64) -> ChanInfoRequest -> f ChanInfoRequest

HasField BakeMacaroonRequest "rootKeyId" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "rootKeyId" -> (Word64 -> f Word64) -> BakeMacaroonRequest -> f BakeMacaroonRequest

HasField Amount "msat" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "msat" -> (Word64 -> f Word64) -> Amount -> f Amount

HasField Amount "sat" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "sat" -> (Word64 -> f Word64) -> Amount -> f Amount

HasField AddInvoiceResponse "addIndex" Word64 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "addIndex" -> (Word64 -> f Word64) -> AddInvoiceResponse -> f AddInvoiceResponse

HasField AddHoldInvoiceRequest "cltvExpiry" Word64 
Instance details

Defined in Proto.InvoiceGrpc

Methods

fieldOf :: Functor f => Proxy# "cltvExpiry" -> (Word64 -> f Word64) -> AddHoldInvoiceRequest -> f AddHoldInvoiceRequest

HasField SendPaymentRequest'DestCustomRecordsEntry "key" Word64 
Instance details

Defined in Proto.RouterGrpc

HasField SendPaymentRequest "maxShardSizeMsat" Word64 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "maxShardSizeMsat" -> (Word64 -> f Word64) -> SendPaymentRequest -> f SendPaymentRequest

HasField SendPaymentRequest "outgoingChanId" Word64 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "outgoingChanId" -> (Word64 -> f Word64) -> SendPaymentRequest -> f SendPaymentRequest

HasField MissionControlConfig "halfLifeSeconds" Word64 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "halfLifeSeconds" -> (Word64 -> f Word64) -> MissionControlConfig -> f MissionControlConfig

HasField MissionControlConfig "minimumFailureRelaxInterval" Word64 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "minimumFailureRelaxInterval" -> (Word64 -> f Word64) -> MissionControlConfig -> f MissionControlConfig

HasField HtlcInfo "incomingAmtMsat" Word64 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "incomingAmtMsat" -> (Word64 -> f Word64) -> HtlcInfo -> f HtlcInfo

HasField HtlcInfo "outgoingAmtMsat" Word64 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "outgoingAmtMsat" -> (Word64 -> f Word64) -> HtlcInfo -> f HtlcInfo

HasField HtlcEvent "incomingChannelId" Word64 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "incomingChannelId" -> (Word64 -> f Word64) -> HtlcEvent -> f HtlcEvent

HasField HtlcEvent "incomingHtlcId" Word64 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "incomingHtlcId" -> (Word64 -> f Word64) -> HtlcEvent -> f HtlcEvent

HasField HtlcEvent "outgoingChannelId" Word64 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "outgoingChannelId" -> (Word64 -> f Word64) -> HtlcEvent -> f HtlcEvent

HasField HtlcEvent "outgoingHtlcId" Word64 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "outgoingHtlcId" -> (Word64 -> f Word64) -> HtlcEvent -> f HtlcEvent

HasField HtlcEvent "timestampNs" Word64 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "timestampNs" -> (Word64 -> f Word64) -> HtlcEvent -> f HtlcEvent

HasField ForwardHtlcInterceptRequest'CustomRecordsEntry "key" Word64 
Instance details

Defined in Proto.RouterGrpc

HasField ForwardHtlcInterceptRequest "incomingAmountMsat" Word64 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "incomingAmountMsat" -> (Word64 -> f Word64) -> ForwardHtlcInterceptRequest -> f ForwardHtlcInterceptRequest

HasField ForwardHtlcInterceptRequest "outgoingAmountMsat" Word64 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "outgoingAmountMsat" -> (Word64 -> f Word64) -> ForwardHtlcInterceptRequest -> f ForwardHtlcInterceptRequest

HasField ForwardHtlcInterceptRequest "outgoingRequestedChanId" Word64 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "outgoingRequestedChanId" -> (Word64 -> f Word64) -> ForwardHtlcInterceptRequest -> f ForwardHtlcInterceptRequest

HasField CircuitKey "chanId" Word64 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "chanId" -> (Word64 -> f Word64) -> CircuitKey -> f CircuitKey

HasField CircuitKey "htlcId" Word64 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "htlcId" -> (Word64 -> f Word64) -> CircuitKey -> f CircuitKey

HasField BuildRouteRequest "outgoingChanId" Word64 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "outgoingChanId" -> (Word64 -> f Word64) -> BuildRouteRequest -> f BuildRouteRequest

HasField ListMacaroonIDsResponse "rootKeyIds" [Word64] 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "rootKeyIds" -> ([Word64] -> f [Word64]) -> ListMacaroonIDsResponse -> f ListMacaroonIDsResponse

HasField ListMacaroonIDsResponse "vec'rootKeyIds" (Vector Word64) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'rootKeyIds" -> (Vector Word64 -> f (Vector Word64)) -> ListMacaroonIDsResponse -> f ListMacaroonIDsResponse

HasField SendPaymentRequest "outgoingChanIds" [Word64] 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "outgoingChanIds" -> ([Word64] -> f [Word64]) -> SendPaymentRequest -> f SendPaymentRequest

HasField SendPaymentRequest "vec'outgoingChanIds" (Vector Word64) 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'outgoingChanIds" -> (Vector Word64 -> f (Vector Word64)) -> SendPaymentRequest -> f SendPaymentRequest

HasField SendRequest "destCustomRecords" (Map Word64 ByteString) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "destCustomRecords" -> (Map Word64 ByteString -> f (Map Word64 ByteString)) -> SendRequest -> f SendRequest

HasField QueryRoutesRequest "destCustomRecords" (Map Word64 ByteString) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "destCustomRecords" -> (Map Word64 ByteString -> f (Map Word64 ByteString)) -> QueryRoutesRequest -> f QueryRoutesRequest

HasField InvoiceHTLC "customRecords" (Map Word64 ByteString) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "customRecords" -> (Map Word64 ByteString -> f (Map Word64 ByteString)) -> InvoiceHTLC -> f InvoiceHTLC

HasField Hop "customRecords" (Map Word64 ByteString) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "customRecords" -> (Map Word64 ByteString -> f (Map Word64 ByteString)) -> Hop -> f Hop

HasField SendPaymentRequest "destCustomRecords" (Map Word64 ByteString) 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "destCustomRecords" -> (Map Word64 ByteString -> f (Map Word64 ByteString)) -> SendPaymentRequest -> f SendPaymentRequest

HasField ForwardHtlcInterceptRequest "customRecords" (Map Word64 ByteString) 
Instance details

Defined in Proto.RouterGrpc

newtype Vector Word64 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector Word64 = V_Word64 (Vector Word64)
type NatNumMaxBound Word64 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Word64 = 18446744073709551615
type Difference Word64 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Word64 = Word64
type PrimSize Word64 
Instance details

Defined in Basement.PrimType

type PrimSize Word64 = 8
newtype MVector s Word64 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Word64 = MV_Word64 (MVector s Word64)

data Ptr a #

A value of type Ptr a represents a pointer to an object, or an array of objects, which may be marshalled to or from Haskell values of type a.

The type a will often be an instance of class Storable which provides the marshalling operations. However this is not essential, and you can provide your own operations to access the pointer. For example you might write small foreign functions to get or set the fields of a C struct.

Instances
NFData1 Ptr

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> Ptr a -> () #

Generic1 (URec (Ptr ()) :: k -> Type) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 (URec (Ptr ())) :: k -> Type #

Methods

from1 :: URec (Ptr ()) a -> Rep1 (URec (Ptr ())) a #

to1 :: Rep1 (URec (Ptr ())) a -> URec (Ptr ()) a #

Eq (Ptr a)

Since: base-2.1

Instance details

Defined in GHC.Ptr

Methods

(==) :: Ptr a -> Ptr a -> Bool #

(/=) :: Ptr a -> Ptr a -> Bool #

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 #

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 #

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 () #

NFData (Ptr a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Ptr a -> () #

Hashable (Ptr a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Ptr a -> Int #

hash :: Ptr a -> Int

Prim (Ptr a) 
Instance details

Defined in Data.Primitive.Types

Functor (URec (Ptr ()) :: Type -> 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 #

Foldable (URec (Ptr ()) :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => URec (Ptr ()) m -> m #

foldMap :: Monoid m => (a -> m) -> URec (Ptr ()) a -> m #

foldr :: (a -> b -> b) -> b -> URec (Ptr ()) a -> b #

foldr' :: (a -> b -> b) -> b -> URec (Ptr ()) a -> b #

foldl :: (b -> a -> b) -> b -> URec (Ptr ()) a -> b #

foldl' :: (b -> a -> b) -> b -> URec (Ptr ()) a -> b #

foldr1 :: (a -> a -> a) -> URec (Ptr ()) a -> a #

foldl1 :: (a -> a -> a) -> URec (Ptr ()) a -> a #

toList :: URec (Ptr ()) a -> [a] #

null :: URec (Ptr ()) a -> Bool #

length :: URec (Ptr ()) a -> Int #

elem :: Eq a => a -> URec (Ptr ()) a -> Bool #

maximum :: Ord a => URec (Ptr ()) a -> a #

minimum :: Ord a => URec (Ptr ()) a -> a #

sum :: Num a => URec (Ptr ()) a -> a #

product :: Num a => URec (Ptr ()) a -> a #

Traversable (URec (Ptr ()) :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> URec (Ptr ()) a -> f (URec (Ptr ()) b) #

sequenceA :: Applicative f => URec (Ptr ()) (f a) -> f (URec (Ptr ()) a) #

mapM :: Monad m => (a -> m b) -> URec (Ptr ()) a -> m (URec (Ptr ()) b) #

sequence :: Monad m => URec (Ptr ()) (m a) -> m (URec (Ptr ()) a) #

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 #

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 #

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 #

data URec (Ptr ()) (p :: k)

Used for marking occurrences of Addr#

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

data URec (Ptr ()) (p :: k) = UAddr {}
type Rep1 (URec (Ptr ()) :: k -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

type Rep1 (URec (Ptr ()) :: k -> Type) = D1 (MetaData "URec" "GHC.Generics" "base" False) (C1 (MetaCons "UAddr" PrefixI True) (S1 (MetaSel (Just "uAddr#") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (UAddr :: k -> Type)))
type Rep (URec (Ptr ()) p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

type Rep (URec (Ptr ()) p) = D1 (MetaData "URec" "GHC.Generics" "base" False) (C1 (MetaCons "UAddr" PrefixI True) (S1 (MetaSel (Just "uAddr#") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (UAddr :: Type -> Type)))

data FunPtr a #

A value of type FunPtr a is a pointer to a function callable from foreign code. The type a will normally be a foreign type, a function type with zero or more arguments where

A value of type FunPtr a may be a pointer to a foreign function, either returned by another foreign function or imported with a a static address import like

foreign import ccall "stdlib.h &free"
  p_free :: FunPtr (Ptr a -> IO ())

or a pointer to a Haskell function created using a wrapper stub declared to produce a FunPtr of the correct type. For example:

type Compare = Int -> Int -> Bool
foreign import ccall "wrapper"
  mkCompare :: Compare -> IO (FunPtr Compare)

Calls to wrapper stubs like mkCompare allocate storage, which should be released with freeHaskellFunPtr when no longer required.

To convert FunPtr values to corresponding Haskell functions, one can define a dynamic stub for the specific foreign type, e.g.

type IntFunction = CInt -> IO ()
foreign import ccall "dynamic"
  mkFun :: FunPtr IntFunction -> IntFunction
Instances
NFData1 FunPtr

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> FunPtr a -> () #

Eq (FunPtr a) 
Instance details

Defined in GHC.Ptr

Methods

(==) :: FunPtr a -> FunPtr a -> Bool #

(/=) :: FunPtr a -> FunPtr a -> Bool #

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 #

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 #

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 () #

NFData (FunPtr a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: FunPtr a -> () #

Hashable (FunPtr a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> FunPtr a -> Int #

hash :: FunPtr a -> Int

Prim (FunPtr a) 
Instance details

Defined in Data.Primitive.Types

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
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 #

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 -> () #

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

Hashable2 Either 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt2 :: (Int -> a -> Int) -> (Int -> b -> Int) -> Int -> Either a b -> Int

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 #

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 #

fail :: String -> 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 #

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 #

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 #

foldr :: (a0 -> b -> b) -> b -> Either a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Either a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> Either a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> Either a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Either a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> Either a a0 -> a0 #

toList :: Either a a0 -> [a0] #

null :: Either a a0 -> Bool #

length :: Either a a0 -> Int #

elem :: Eq a0 => a0 -> Either a a0 -> Bool #

maximum :: Ord a0 => Either a a0 -> a0 #

minimum :: Ord a0 => Either a a0 -> a0 #

sum :: Num a0 => Either a a0 -> a0 #

product :: Num a0 => Either a a0 -> a0 #

Traversable (Either a)

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) #

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 #

NFData a => NFData1 (Either a)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (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

e ~ SomeException => MonadCatch (Either e) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e0 => Either e a -> (e0 -> Either e a) -> Either e a

e ~ SomeException => MonadMask (Either e) 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. Either e a -> Either e a) -> Either e b) -> Either e b #

uninterruptibleMask :: ((forall a. Either e a -> Either e a) -> Either e b) -> Either e b #

generalBracket :: Either e a -> (a -> ExitCase b -> Either e c) -> (a -> Either e b) -> Either e (b, c) #

e ~ SomeException => MonadThrow (Either e) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e0 => e0 -> Either e a

Hashable a => Hashable1 (Either a) 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a0 -> Int) -> Int -> Either a a0 -> Int

MonadFailure (Either a) 
Instance details

Defined in Basement.Monad

Associated Types

type Failure (Either a) :: Type

Methods

mFail :: Failure (Either a) -> Either a ()

Generic1 (Either a :: Type -> Type) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 (Either a) :: k -> Type #

Methods

from1 :: Either a a0 -> Rep1 (Either a) a0 #

to1 :: Rep1 (Either a) a0 -> Either a a0 #

MonadBaseControl (Either e) (Either e) 
Instance details

Defined in Control.Monad.Trans.Control

Associated Types

type StM (Either e) a :: Type

Methods

liftBaseWith :: (RunInBase (Either e) (Either e) -> Either e a) -> Either e a

restoreM :: StM (Either e) a -> Either e a

(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 #

(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 #

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 #

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 #

(Lift a, Lift b) => Lift (Either a b) 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Either a b -> Q Exp #

(NFData a, NFData b) => NFData (Either a b) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Either a b -> () #

(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] #

(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

(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

(PersistConfig c1, PersistConfig c2, PersistConfigPool c1 ~ PersistConfigPool c2, PersistConfigBackend c1 ~ PersistConfigBackend c2) => PersistConfig (Either c1 c2) 
Instance details

Defined in Database.Persist.Class.PersistConfig

Associated Types

type PersistConfigBackend (Either c1 c2) :: (Type -> Type) -> Type -> Type

type PersistConfigPool (Either c1 c2) :: Type

Methods

loadConfig :: Value -> Parser (Either c1 c2)

applyEnv :: Either c1 c2 -> IO (Either c1 c2)

createPoolConfig :: Either c1 c2 -> IO (PersistConfigPool (Either c1 c2))

runPool :: MonadUnliftIO m => Either c1 c2 -> PersistConfigBackend (Either c1 c2) m a -> PersistConfigPool (Either c1 c2) -> m a

(TypeError (DisallowInstance "Either") :: Constraint) => Container (Either a b) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Either a b) :: Type #

Methods

toList :: Either a b -> [Element (Either a b)] #

null :: Either a b -> Bool #

foldr :: (Element (Either a b) -> b0 -> b0) -> b0 -> Either a b -> b0 #

foldl :: (b0 -> Element (Either a b) -> b0) -> b0 -> Either a b -> b0 #

foldl' :: (b0 -> Element (Either a b) -> b0) -> b0 -> Either a b -> b0 #

length :: Either a b -> Int #

elem :: Element (Either a b) -> Either a b -> Bool #

maximum :: Either a b -> Element (Either a b) #

minimum :: Either a b -> Element (Either a b) #

foldMap :: Monoid m => (Element (Either a b) -> m) -> Either a b -> m #

fold :: Either a b -> Element (Either a b) #

foldr' :: (Element (Either a b) -> b0 -> b0) -> b0 -> Either a b -> b0 #

foldr1 :: (Element (Either a b) -> Element (Either a b) -> Element (Either a b)) -> Either a b -> Element (Either a b) #

foldl1 :: (Element (Either a b) -> Element (Either a b) -> Element (Either a b)) -> Either a b -> Element (Either a b) #

notElem :: Element (Either a b) -> Either a b -> Bool #

all :: (Element (Either a b) -> Bool) -> Either a b -> Bool #

any :: (Element (Either a b) -> Bool) -> Either a b -> Bool #

and :: Either a b -> Bool #

or :: Either a b -> Bool #

find :: (Element (Either a b) -> Bool) -> Either a b -> Maybe (Element (Either a b)) #

safeHead :: Either a b -> Maybe (Element (Either a b)) #

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 Rep1 (Either a :: Type -> Type)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

type Rep (Either a b)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

type PersistConfigBackend (Either c1 c2) 
Instance details

Defined in Database.Persist.Class.PersistConfig

type PersistConfigBackend (Either c1 c2) = PersistConfigBackend c1
type PersistConfigPool (Either c1 c2) 
Instance details

Defined in Database.Persist.Class.PersistConfig

type PersistConfigPool (Either c1 c2) = PersistConfigPool c1
type Element (Either a b) 
Instance details

Defined in Universum.Container.Class

type Element (Either a b) = ElementDefault (Either a b)

type Type = Type #

The kind of types with values. For example Int :: Type.

data Constraint #

The kind of constraints, like Show a

data Nat #

(Kind) This is the kind of type-level natural numbers.

type family CmpNat (a :: Nat) (b :: Nat) :: Ordering where ... #

Comparison of type-level naturals, as a function.

Since: base-4.7.0.0

class a ~R# b => Coercible (a :: k0) (b :: k0) #

Coercible is a two-parameter class that has instances for types a and b if the compiler can infer that they have the same representation. This class does not have regular instances; instead they are created on-the-fly during type-checking. Trying to manually declare an instance of Coercible is an error.

Nevertheless one can pretend that the following three kinds of instances exist. First, as a trivial base-case:

instance Coercible a a

Furthermore, for every type constructor there is an instance that allows to coerce under the type constructor. For example, let D be a prototypical type constructor (data or newtype) with three type arguments, which have roles nominal, representational resp. phantom. Then there is an instance of the form

instance Coercible b b' => Coercible (D a b c) (D a b' c')

Note that the nominal type arguments are equal, the representational type arguments can differ, but need to have a Coercible instance themself, and the phantom type arguments can be changed arbitrarily.

The third kind of instance exists for every newtype NT = MkNT T and comes in two variants, namely

instance Coercible a T => Coercible a NT
instance Coercible T b => Coercible NT b

This instance is only usable if the constructor MkNT is in scope.

If, as a library author of a type constructor like Set a, you want to prevent a user of your module to write coerce :: Set T -> Set NT, you need to set the role of Set's type parameter to nominal, by writing

type role Set nominal

For more details about this feature, please refer to Safe Coercions by Joachim Breitner, Richard A. Eisenberg, Simon Peyton Jones and Stephanie Weirich.

Since: ghc-prim-4.7.0.0

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>:2:1 in interactive:Ghci1

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
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 :: Type #

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

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
Eq Handle

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Handle.Types

Methods

(==) :: Handle -> Handle -> Bool #

(/=) :: Handle -> Handle -> Bool #

Show Handle

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Handle.Types

integralEnumFromThenTo :: Integral a => a -> a -> a -> [a] #

integralEnumFromTo :: Integral a => a -> a -> [a] #

integralEnumFromThen :: (Integral a, Bounded a) => a -> a -> [a] #

integralEnumFrom :: (Integral a, Bounded a) => a -> [a] #

gcdInt' :: Int -> Int -> Int #

(^%^) :: Integral a => Rational -> a -> Rational #

numericEnumFromThenTo :: (Ord a, Fractional a) => a -> a -> a -> [a] #

numericEnumFromTo :: (Ord a, Fractional a) => a -> a -> [a] #

numericEnumFromThen :: Fractional a => a -> a -> [a] #

numericEnumFrom :: Fractional a => a -> [a] #

reduce :: Integral a => a -> a -> Ratio a #

reduce is a subsidiary function used only in this module. It normalises a ratio by dividing both numerator and denominator by their greatest common divisor.

boundedEnumFromThen :: (Enum a, Bounded a) => a -> a -> [a] #

boundedEnumFrom :: (Enum a, Bounded a) => a -> [a] #

newtype Compose (f :: k -> Type) (g :: k1 -> k) (a :: k1) :: forall k k1. (k -> Type) -> (k1 -> k) -> k1 -> Type infixr 9 #

Right-to-left composition of functors. The composition of applicative functors is always applicative, but the composition of monads is not always a monad.

Constructors

Compose infixr 9 

Fields

Instances
Functor f => Generic1 (Compose f g :: k -> Type) 
Instance details

Defined in Data.Functor.Compose

Associated Types

type Rep1 (Compose f g) :: k -> Type #

Methods

from1 :: Compose f g a -> Rep1 (Compose f g) a #

to1 :: Rep1 (Compose f g) a -> Compose f g a #

Unbox (f (g a)) => MVector MVector (Compose f g a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s (Compose f g a) -> Int

basicUnsafeSlice :: Int -> Int -> MVector s (Compose f g a) -> MVector s (Compose f g a)

basicOverlaps :: MVector s (Compose f g a) -> MVector s (Compose f g a) -> Bool

basicUnsafeNew :: PrimMonad m => Int -> m (MVector (PrimState m) (Compose f g a))

basicInitialize :: PrimMonad m => MVector (PrimState m) (Compose f g a) -> m ()

basicUnsafeReplicate :: PrimMonad m => Int -> Compose f g a -> m (MVector (PrimState m) (Compose f g a))

basicUnsafeRead :: PrimMonad m => MVector (PrimState m) (Compose f g a) -> Int -> m (Compose f g a)

basicUnsafeWrite :: PrimMonad m => MVector (PrimState m) (Compose f g a) -> Int -> Compose f g a -> m ()

basicClear :: PrimMonad m => MVector (PrimState m) (Compose f g a) -> m ()

basicSet :: PrimMonad m => MVector (PrimState m) (Compose f g a) -> Compose f g a -> m ()

basicUnsafeCopy :: PrimMonad m => MVector (PrimState m) (Compose f g a) -> MVector (PrimState m) (Compose f g a) -> m ()

basicUnsafeMove :: PrimMonad m => MVector (PrimState m) (Compose f g a) -> MVector (PrimState m) (Compose f g a) -> m ()

basicUnsafeGrow :: PrimMonad m => MVector (PrimState m) (Compose f g a) -> Int -> m (MVector (PrimState m) (Compose f g a))

Unbox (f (g a)) => Vector Vector (Compose f g a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: PrimMonad m => Mutable Vector (PrimState m) (Compose f g a) -> m (Vector (Compose f g a))

basicUnsafeThaw :: PrimMonad m => Vector (Compose f g a) -> m (Mutable Vector (PrimState m) (Compose f g a))

basicLength :: Vector (Compose f g a) -> Int

basicUnsafeSlice :: Int -> Int -> Vector (Compose f g a) -> Vector (Compose f g a)

basicUnsafeIndexM :: Monad m => Vector (Compose f g a) -> Int -> m (Compose f g a)

basicUnsafeCopy :: PrimMonad m => Mutable Vector (PrimState m) (Compose f g a) -> Vector (Compose f g a) -> m ()

elemseq :: Vector (Compose f g a) -> Compose f g a -> b -> b

(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 #

(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 #

(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 #

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 #

(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) #

(Eq1 f, Eq1 g) => Eq1 (Compose f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

liftEq :: (a -> b -> Bool) -> Compose f g a -> Compose f g b -> Bool #

(Ord1 f, Ord1 g) => Ord1 (Compose f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

liftCompare :: (a -> b -> Ordering) -> Compose f g a -> Compose f g b -> Ordering #

(Read1 f, Read1 g) => Read1 (Compose f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (Compose f g a) #

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [Compose f g a] #

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (Compose f g a) #

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [Compose f g a] #

(Show1 f, Show1 g) => Show1 (Compose f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Compose f g a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Compose f g a] -> ShowS #

(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] #

(NFData1 f, NFData1 g) => NFData1 (Compose f g)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> Compose f g a -> () #

(FromJSON1 f, FromJSON1 g) => FromJSON1 (Compose f g) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (Compose f g a)

liftParseJSONList :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [Compose f g a]

(ToJSON1 f, ToJSON1 g) => ToJSON1 (Compose f g) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Value) -> ([a] -> Value) -> Compose f g a -> Value

liftToJSONList :: (a -> Value) -> ([a] -> Value) -> [Compose f g a] -> Value

liftToEncoding :: (a -> Encoding) -> ([a] -> Encoding) -> Compose f g a -> Encoding

liftToEncodingList :: (a -> Encoding) -> ([a] -> Encoding) -> [Compose f g a] -> Encoding

(Hashable1 f, Hashable1 g) => Hashable1 (Compose f g) 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> Compose f g a -> Int

(Identical f, Identical g) => Identical (Compose f g) 
Instance details

Defined in Lens.Family.Identical

Methods

extract :: Compose f g a -> a

(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 #

(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 :: (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) #

(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 #

(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] #

(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 #

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 #

(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 -> () #

(FromJSON1 f, FromJSON1 g, FromJSON a) => FromJSON (Compose f g a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Compose f g a) #

parseJSONList :: Value -> Parser [Compose f g a] #

(Hashable1 f, Hashable1 g, Hashable a) => Hashable (Compose f g a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Compose f g a -> Int #

hash :: Compose f g a -> Int

(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

Unbox (f (g a)) => Unbox (Compose f g a) 
Instance details

Defined in Data.Vector.Unboxed.Base

type Rep1 (Compose f g :: k -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

type Rep1 (Compose f g :: k -> Type) = D1 (MetaData "Compose" "Data.Functor.Compose" "base" True) (C1 (MetaCons "Compose" PrefixI True) (S1 (MetaSel (Just "getCompose") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (f :.: Rec1 g)))
newtype MVector s (Compose f g a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s (Compose f g a) = MV_Compose (MVector s (f (g a)))
type Rep (Compose f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

type Rep (Compose f g a) = D1 (MetaData "Compose" "Data.Functor.Compose" "base" True) (C1 (MetaCons "Compose" PrefixI True) (S1 (MetaSel (Just "getCompose") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (f (g a)))))
newtype Vector (Compose f g a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector (Compose f g a) = V_Compose (Vector (f (g a)))

vacuous :: Functor f => f Void -> f a #

If Void is uninhabited then any Functor that holds only values of type Void is holding no values.

Since: base-4.8.0.0

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 Void #

Uninhabited data type

Since: base-4.8.0.0

Instances
Eq Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Methods

(==) :: Void -> Void -> Bool #

(/=) :: Void -> Void -> Bool #

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 :: (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 #

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 #

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 #

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

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 #

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

NFData Void

Defined as rnf = absurd.

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Void -> () #

FromJSON Void 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Void #

parseJSONList :: Value -> Parser [Void] #

Hashable Void 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Void -> Int #

hash :: Void -> Int

ToJSON Void 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Void -> Value

toEncoding :: Void -> Encoding

toJSONList :: [Void] -> Value

toEncodingList :: [Void] -> Encoding

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)

mtimesDefault :: (Integral b, Monoid a) => b -> a -> a #

Repeat a value n times.

mtimesDefault n a = a <> a <> ... <> a  -- using <> (n-1) times

Implemented using stimes and mempty.

This is a suitable definition for an mtimes member of Monoid.

cycle1 :: Semigroup m => m -> m #

A generalization of cycle to an arbitrary Semigroup. May fail to terminate for some values in some semigroups.

data WrappedMonoid m #

Provide a Semigroup for an arbitrary Monoid.

NOTE: This is not needed anymore since Semigroup became a superclass of Monoid in base-4.11 and this newtype be deprecated at some point in the future.

Instances
NFData1 WrappedMonoid

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> WrappedMonoid a -> () #

FromJSON1 WrappedMonoid 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (WrappedMonoid a)

liftParseJSONList :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [WrappedMonoid a]

ToJSON1 WrappedMonoid 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Value) -> ([a] -> Value) -> WrappedMonoid a -> Value

liftToJSONList :: (a -> Value) -> ([a] -> Value) -> [WrappedMonoid a] -> Value

liftToEncoding :: (a -> Encoding) -> ([a] -> Encoding) -> WrappedMonoid a -> Encoding

liftToEncodingList :: (a -> Encoding) -> ([a] -> Encoding) -> [WrappedMonoid a] -> Encoding

Unbox a => MVector MVector (WrappedMonoid a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s (WrappedMonoid a) -> Int

basicUnsafeSlice :: Int -> Int -> MVector s (WrappedMonoid a) -> MVector s (WrappedMonoid a)

basicOverlaps :: MVector s (WrappedMonoid a) -> MVector s (WrappedMonoid a) -> Bool

basicUnsafeNew :: PrimMonad m => Int -> m (MVector (PrimState m) (WrappedMonoid a))

basicInitialize :: PrimMonad m => MVector (PrimState m) (WrappedMonoid a) -> m ()

basicUnsafeReplicate :: PrimMonad m => Int -> WrappedMonoid a -> m (MVector (PrimState m) (WrappedMonoid a))

basicUnsafeRead :: PrimMonad m => MVector (PrimState m) (WrappedMonoid a) -> Int -> m (WrappedMonoid a)

basicUnsafeWrite :: PrimMonad m => MVector (PrimState m) (WrappedMonoid a) -> Int -> WrappedMonoid a -> m ()

basicClear :: PrimMonad m => MVector (PrimState m) (WrappedMonoid a) -> m ()

basicSet :: PrimMonad m => MVector (PrimState m) (WrappedMonoid a) -> WrappedMonoid a -> m ()

basicUnsafeCopy :: PrimMonad m => MVector (PrimState m) (WrappedMonoid a) -> MVector (PrimState m) (WrappedMonoid a) -> m ()

basicUnsafeMove :: PrimMonad m => MVector (PrimState m) (WrappedMonoid a) -> MVector (PrimState m) (WrappedMonoid a) -> m ()

basicUnsafeGrow :: PrimMonad m => MVector (PrimState m) (WrappedMonoid a) -> Int -> m (MVector (PrimState m) (WrappedMonoid a))

Unbox a => Vector Vector (WrappedMonoid a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: PrimMonad m => Mutable Vector (PrimState m) (WrappedMonoid a) -> m (Vector (WrappedMonoid a))

basicUnsafeThaw :: PrimMonad m => Vector (WrappedMonoid a) -> m (Mutable Vector (PrimState m) (WrappedMonoid a))

basicLength :: Vector (WrappedMonoid a) -> Int

basicUnsafeSlice :: Int -> Int -> Vector (WrappedMonoid a) -> Vector (WrappedMonoid a)

basicUnsafeIndexM :: Monad m => Vector (WrappedMonoid a) -> Int -> m (WrappedMonoid a)

basicUnsafeCopy :: PrimMonad m => Mutable Vector (PrimState m) (WrappedMonoid a) -> Vector (WrappedMonoid a) -> m ()

elemseq :: Vector (WrappedMonoid a) -> WrappedMonoid a -> b -> b

Bounded m => Bounded (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Enum a => Enum (WrappedMonoid a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Eq m => Eq (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

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 :: (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) #

Ord m => Ord (WrappedMonoid m)

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

Show m => Show (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Generic (WrappedMonoid m) 
Instance details

Defined in Data.Semigroup

Associated Types

type Rep (WrappedMonoid m) :: Type -> Type #

Monoid m => Semigroup (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Monoid m => Monoid (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

NFData m => NFData (WrappedMonoid m)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: WrappedMonoid m -> () #

FromJSON a => FromJSON (WrappedMonoid a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (WrappedMonoid a) #

parseJSONList :: Value -> Parser [WrappedMonoid a] #

Hashable a => Hashable (WrappedMonoid a) 
Instance details

Defined in Data.Hashable.Class

ToJSON a => ToJSON (WrappedMonoid a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: WrappedMonoid a -> Value

toEncoding :: WrappedMonoid a -> Encoding

toJSONList :: [WrappedMonoid a] -> Value

toEncodingList :: [WrappedMonoid a] -> Encoding

Unbox a => Unbox (WrappedMonoid a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Generic1 WrappedMonoid 
Instance details

Defined in Data.Semigroup

Associated Types

type Rep1 WrappedMonoid :: k -> Type #

newtype MVector s (WrappedMonoid a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s (WrappedMonoid a) = MV_WrappedMonoid (MVector s a)
type Rep (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

type Rep (WrappedMonoid m) = D1 (MetaData "WrappedMonoid" "Data.Semigroup" "base" True) (C1 (MetaCons "WrapMonoid" PrefixI True) (S1 (MetaSel (Just "unwrapMonoid") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 m)))
newtype Vector (WrappedMonoid a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector (WrappedMonoid a) = V_WrappedMonoid (Vector a)
type Rep1 WrappedMonoid

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

type Rep1 WrappedMonoid = D1 (MetaData "WrappedMonoid" "Data.Semigroup" "base" True) (C1 (MetaCons "WrapMonoid" PrefixI True) (S1 (MetaSel (Just "unwrapMonoid") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype Option a #

Option is effectively Maybe with a better instance of Monoid, built off of an underlying Semigroup instead of an underlying Monoid.

Ideally, this type would not exist at all and we would just fix the Monoid instance of Maybe.

In GHC 8.4 and higher, the Monoid instance for Maybe has been corrected to lift a Semigroup instance instead of a Monoid instance. Consequently, this type is no longer useful. It will be marked deprecated in GHC 8.8 and removed in GHC 8.10.

Constructors

Option 

Fields

Instances
Monad Option

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(>>=) :: Option a -> (a -> Option b) -> Option b #

(>>) :: Option a -> Option b -> Option b #

return :: a -> Option a #

fail :: String -> Option a #

Functor Option

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

fmap :: (a -> b) -> Option a -> Option b #

(<$) :: a -> Option b -> Option a #

MonadFix Option

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

mfix :: (a -> Option a) -> Option a #

Applicative Option

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

pure :: a -> Option a #

(<*>) :: Option (a -> b) -> Option a -> Option b #

liftA2 :: (a -> b -> c) -> Option a -> Option b -> Option c #

(*>) :: Option a -> Option b -> Option b #

(<*) :: Option a -> Option b -> Option a #

Foldable Option

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

fold :: Monoid m => Option m -> m #

foldMap :: Monoid m => (a -> m) -> Option a -> m #

foldr :: (a -> b -> b) -> b -> Option a -> b #

foldr' :: (a -> b -> b) -> b -> Option a -> b #

foldl :: (b -> a -> b) -> b -> Option a -> b #

foldl' :: (b -> a -> b) -> b -> Option a -> b #

foldr1 :: (a -> a -> a) -> Option a -> a #

foldl1 :: (a -> a -> a) -> Option a -> a #

toList :: Option a -> [a] #

null :: Option a -> Bool #

length :: Option a -> Int #

elem :: Eq a => a -> Option a -> Bool #

maximum :: Ord a => Option a -> a #

minimum :: Ord a => Option a -> a #

sum :: Num a => Option a -> a #

product :: Num a => Option a -> a #

Traversable Option

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

traverse :: Applicative f => (a -> f b) -> Option a -> f (Option b) #

sequenceA :: Applicative f => Option (f a) -> f (Option a) #

mapM :: Monad m => (a -> m b) -> Option a -> m (Option b) #

sequence :: Monad m => Option (m a) -> m (Option a) #

Alternative Option

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

empty :: Option a #

(<|>) :: Option a -> Option a -> Option a #

some :: Option a -> Option [a] #

many :: Option a -> Option [a] #

MonadPlus Option

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

mzero :: Option a #

mplus :: Option a -> Option a -> Option a #

NFData1 Option

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> Option a -> () #

FromJSON1 Option 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (Option a)

liftParseJSONList :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [Option a]

ToJSON1 Option 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Value) -> ([a] -> Value) -> Option a -> Value

liftToJSONList :: (a -> Value) -> ([a] -> Value) -> [Option a] -> Value

liftToEncoding :: (a -> Encoding) -> ([a] -> Encoding) -> Option a -> Encoding

liftToEncodingList :: (a -> Encoding) -> ([a] -> Encoding) -> [Option a] -> Encoding

(Selector s, GToJSON enc arity (K1 i (Maybe a) :: Type -> Type), KeyValuePair enc pairs, Monoid pairs) => RecordToPairs enc pairs arity (S1 s (K1 i (Option a) :: Type -> Type)) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

recordToPairs :: Options -> ToArgs enc arity a0 -> S1 s (K1 i (Option a)) a0 -> pairs

(Selector s, FromJSON a) => RecordFromJSON arity (S1 s (K1 i (Option 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 (Option a)) a0)

Eq a => Eq (Option a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(==) :: Option a -> Option a -> Bool #

(/=) :: Option a -> Option a -> Bool #

Data a => Data (Option 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) -> Option a -> c (Option a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Option a) #

toConstr :: Option a -> Constr #

dataTypeOf :: Option a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Option a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Option a)) #

gmapT :: (forall b. Data b => b -> b) -> Option a -> Option a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Option a -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Option a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Option a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Option a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Option a -> m (Option a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Option a -> m (Option a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Option a -> m (Option a) #

Ord a => Ord (Option a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

compare :: Option a -> Option a -> Ordering #

(<) :: Option a -> Option a -> Bool #

(<=) :: Option a -> Option a -> Bool #

(>) :: Option a -> Option a -> Bool #

(>=) :: Option a -> Option a -> Bool #

max :: Option a -> Option a -> Option a #

min :: Option a -> Option a -> Option a #

Read a => Read (Option a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Show a => Show (Option a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

showsPrec :: Int -> Option a -> ShowS #

show :: Option a -> String #

showList :: [Option a] -> ShowS #

Generic (Option a) 
Instance details

Defined in Data.Semigroup

Associated Types

type Rep (Option a) :: Type -> Type #

Methods

from :: Option a -> Rep (Option a) x #

to :: Rep (Option a) x -> Option a #

Semigroup a => Semigroup (Option a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(<>) :: Option a -> Option a -> Option a #

sconcat :: NonEmpty (Option a) -> Option a #

stimes :: Integral b => b -> Option a -> Option a #

Semigroup a => Monoid (Option a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

mempty :: Option a #

mappend :: Option a -> Option a -> Option a #

mconcat :: [Option a] -> Option a #

NFData a => NFData (Option a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Option a -> () #

FromJSON a => FromJSON (Option a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Option a) #

parseJSONList :: Value -> Parser [Option a] #

Hashable a => Hashable (Option a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Option a -> Int #

hash :: Option a -> Int

ToJSON a => ToJSON (Option a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Option a -> Value

toEncoding :: Option a -> Encoding

toJSONList :: [Option a] -> Value

toEncodingList :: [Option a] -> Encoding

Generic1 Option 
Instance details

Defined in Data.Semigroup

Associated Types

type Rep1 Option :: k -> Type #

Methods

from1 :: Option a -> Rep1 Option a #

to1 :: Rep1 Option a -> Option a #

type Rep (Option a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

type Rep (Option a) = D1 (MetaData "Option" "Data.Semigroup" "base" True) (C1 (MetaCons "Option" PrefixI True) (S1 (MetaSel (Just "getOption") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe a))))
type Rep1 Option

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

type Rep1 Option = D1 (MetaData "Option" "Data.Semigroup" "base" True) (C1 (MetaCons "Option" PrefixI True) (S1 (MetaSel (Just "getOption") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 Maybe)))

sortWith :: Ord b => (a -> b) -> [a] -> [a] #

The sortWith function sorts a list of elements using the user supplied function to project something out of each element

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
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 (,)

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 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 ((,,) 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 (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 #

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 (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 (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) #

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) #

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 #

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 ((,,,,,) 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) #

(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 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) #

(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 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 #

init :: NonEmpty a -> [a] #

Extract everything except the last element of the stream.

last :: NonEmpty a -> a #

Extract the last element of the stream.

tail :: NonEmpty a -> [a] #

Extract the possibly-empty tail of the stream.

head :: NonEmpty a -> a #

Extract the first element of the stream.

nonEmpty :: [a] -> Maybe (NonEmpty a) #

nonEmpty efficiently turns a normal list into a NonEmpty stream, producing Nothing if the input is empty.

showStackTrace :: IO (Maybe String) #

Get a string representation of the current execution stack state.

getStackTrace :: IO (Maybe [Location]) #

Get a trace of the current execution stack state.

Returns Nothing if stack trace support isn't available on host machine.

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.

Instances
MonadIO IO

Since: base-4.9.0.0

Instance details

Defined in Control.Monad.IO.Class

Methods

liftIO :: IO a -> IO a #

MonadIO Q 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

liftIO :: IO a -> Q 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 #

MonadIO m => MonadIO (KatipT m) 
Instance details

Defined in Katip.Core

Methods

liftIO :: IO a -> KatipT m a #

MonadIO m => MonadIO (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

liftIO :: IO a -> KatipContextT m a #

MonadIO m => MonadIO (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

liftIO :: IO a -> ResourceT m a #

MonadIO m => MonadIO (NoLoggingT m) 
Instance details

Defined in Katip.Monadic

Methods

liftIO :: IO a -> NoLoggingT m 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 (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

liftIO :: IO a -> IdentityT 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 (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

liftIO :: IO a -> ReaderT 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 #

(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 #

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 (ContT r m) 
Instance details

Defined in Control.Monad.Trans.Cont

Methods

liftIO :: IO a -> ContT r 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 #

(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 #

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

(<$!>) :: Monad m => (a -> b) -> m a -> m b infixl 4 #

Strict version of <$>.

Since: base-4.8.0.0

unless :: Applicative f => Bool -> f () -> f () #

The reverse of when.

replicateM_ :: Applicative m => Int -> m a -> m () #

Like replicateM, but discards the result.

replicateM :: Applicative m => Int -> m a -> m [a] #

replicateM n act performs the action n times, gathering the results.

foldM_ :: (Foldable t, Monad m) => (b -> a -> m b) -> b -> t a -> m () #

Like foldM, but discards the result.

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

zipWithM_ :: Applicative m => (a -> b -> m c) -> [a] -> [b] -> m () #

zipWithM_ is the extension of zipWithM which ignores the final result.

zipWithM :: Applicative m => (a -> b -> m c) -> [a] -> [b] -> m [c] #

The zipWithM function generalizes zipWith to arbitrary applicative functors.

mapAndUnzipM :: Applicative m => (a -> m (b, c)) -> [a] -> m ([b], [c]) #

The mapAndUnzipM function maps its first argument over a list, returning the result as a pair of lists. This function is mainly used with complicated data structures or a state-transforming monad.

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

(<=<) :: 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.

filterM :: Applicative m => (a -> m Bool) -> [a] -> m [a] #

This generalizes the list-based filter function.

foldMapDefault :: (Traversable t, Monoid m) => (a -> m) -> t a -> m #

This function may be used as a value for foldMap in a Foldable instance.

foldMapDefault f ≡ getConst . traverse (Const . f)

fmapDefault :: Traversable t => (a -> b) -> t a -> t b #

This function may be used as a value for fmap in a Functor instance, provided that traverse is defined. (Using fmapDefault with a Traversable instance defined only by sequenceA will result in infinite recursion.)

fmapDefault f ≡ runIdentity . traverse (Identity . f)

mapAccumR :: Traversable t => (a -> b -> (a, c)) -> a -> t b -> (a, t c) #

The mapAccumR function behaves like a combination of fmap and foldr; it applies a function to each element of a structure, passing an accumulating parameter from right to left, and returning a final value of this accumulator together with the new structure.

mapAccumL :: Traversable t => (a -> b -> (a, c)) -> a -> t b -> (a, t c) #

The mapAccumL function behaves like a combination of fmap and foldl; it applies a function to each element of a structure, passing an accumulating parameter from left to right, and returning a final value of this accumulator together with the new structure.

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_.

optional :: Alternative f => f a -> f (Maybe a) #

One or none.

newtype ZipList a #

Lists, but with an Applicative functor based on zipping.

Constructors

ZipList 

Fields

Instances
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 #

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 #

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 #

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 #

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) #

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] #

NFData1 ZipList

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> ZipList a -> () #

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 #

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 #

Read a => Read (ZipList a)

Since: base-4.7.0.0

Instance details

Defined in Control.Applicative

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 #

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 #

NFData a => NFData (ZipList a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: ZipList a -> () #

Container (ZipList a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (ZipList a) :: Type #

Methods

toList :: ZipList a -> [Element (ZipList a)] #

null :: ZipList a -> Bool #

foldr :: (Element (ZipList a) -> b -> b) -> b -> ZipList a -> b #

foldl :: (b -> Element (ZipList a) -> b) -> b -> ZipList a -> b #

foldl' :: (b -> Element (ZipList a) -> b) -> b -> ZipList a -> b #

length :: ZipList a -> Int #

elem :: Element (ZipList a) -> ZipList a -> Bool #

maximum :: ZipList a -> Element (ZipList a) #

minimum :: ZipList a -> Element (ZipList a) #

foldMap :: Monoid m => (Element (ZipList a) -> m) -> ZipList a -> m #

fold :: ZipList a -> Element (ZipList a) #

foldr' :: (Element (ZipList a) -> b -> b) -> b -> ZipList a -> b #

foldr1 :: (Element (ZipList a) -> Element (ZipList a) -> Element (ZipList a)) -> ZipList a -> Element (ZipList a) #

foldl1 :: (Element (ZipList a) -> Element (ZipList a) -> Element (ZipList a)) -> ZipList a -> Element (ZipList a) #

notElem :: Element (ZipList a) -> ZipList a -> Bool #

all :: (Element (ZipList a) -> Bool) -> ZipList a -> Bool #

any :: (Element (ZipList a) -> Bool) -> ZipList a -> Bool #

and :: ZipList a -> Bool #

or :: ZipList a -> Bool #

find :: (Element (ZipList a) -> Bool) -> ZipList a -> Maybe (Element (ZipList a)) #

safeHead :: ZipList a -> Maybe (Element (ZipList a)) #

Generic1 ZipList 
Instance details

Defined in Control.Applicative

Associated Types

type Rep1 ZipList :: k -> Type #

Methods

from1 :: ZipList a -> Rep1 ZipList a #

to1 :: Rep1 ZipList a -> ZipList a #

type Rep (ZipList a)

Since: base-4.7.0.0

Instance details

Defined in Control.Applicative

type Rep (ZipList a) = D1 (MetaData "ZipList" "Control.Applicative" "base" True) (C1 (MetaCons "ZipList" PrefixI True) (S1 (MetaSel (Just "getZipList") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [a])))
type Item (ZipList a) 
Instance details

Defined in Data.Orphans

type Item (ZipList a) = a
type Element (ZipList a) 
Instance details

Defined in Universum.Container.Class

type Element (ZipList a) = ElementDefault (ZipList a)
type Rep1 ZipList

Since: base-4.7.0.0

Instance details

Defined in Control.Applicative

type Rep1 ZipList = D1 (MetaData "ZipList" "Control.Applicative" "base" True) (C1 (MetaCons "ZipList" PrefixI True) (S1 (MetaSel (Just "getZipList") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 [])))

(&&&) :: Arrow a => 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.

newtype Identity a #

Identity functor and monad. (a non-strict monad)

Since: base-4.8.0.0

Constructors

Identity 

Fields

Instances
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 #

fail :: String -> 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 #

MonadFix Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

mfix :: (a -> Identity a) -> 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 #

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 #

foldr :: (a -> b -> b) -> b -> Identity a -> b #

foldr' :: (a -> b -> b) -> b -> Identity a -> b #

foldl :: (b -> a -> b) -> b -> Identity a -> b #

foldl' :: (b -> a -> b) -> b -> Identity a -> b #

foldr1 :: (a -> a -> a) -> Identity a -> a #

foldl1 :: (a -> a -> a) -> Identity a -> a #

toList :: Identity a -> [a] #

null :: Identity a -> Bool #

length :: Identity a -> Int #

elem :: Eq a => a -> Identity a -> Bool #

maximum :: Ord a => Identity a -> a #

minimum :: Ord a => Identity a -> a #

sum :: Num a => Identity a -> a #

product :: Num a => Identity a -> a #

Traversable Identity

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) #

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 #

NFData1 Identity

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> 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

Hashable1 Identity 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> Identity a -> Int

Identical Identity 
Instance details

Defined in Lens.Family.Identical

Methods

extract :: Identity a -> a

MonadBaseControl Identity Identity 
Instance details

Defined in Control.Monad.Trans.Control

Associated Types

type StM Identity a :: Type

Methods

liftBaseWith :: (RunInBase Identity Identity -> Identity a) -> Identity a

restoreM :: StM Identity a -> Identity a

Unbox a => MVector MVector (Identity a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s (Identity a) -> Int

basicUnsafeSlice :: Int -> Int -> MVector s (Identity a) -> MVector s (Identity a)

basicOverlaps :: MVector s (Identity a) -> MVector s (Identity a) -> Bool

basicUnsafeNew :: PrimMonad m => Int -> m (MVector (PrimState m) (Identity a))

basicInitialize :: PrimMonad m => MVector (PrimState m) (Identity a) -> m ()

basicUnsafeReplicate :: PrimMonad m => Int -> Identity a -> m (MVector (PrimState m) (Identity a))

basicUnsafeRead :: PrimMonad m => MVector (PrimState m) (Identity a) -> Int -> m (Identity a)

basicUnsafeWrite :: PrimMonad m => MVector (PrimState m) (Identity a) -> Int -> Identity a -> m ()

basicClear :: PrimMonad m => MVector (PrimState m) (Identity a) -> m ()

basicSet :: PrimMonad m => MVector (PrimState m) (Identity a) -> Identity a -> m ()

basicUnsafeCopy :: PrimMonad m => MVector (PrimState m) (Identity a) -> MVector (PrimState m) (Identity a) -> m ()

basicUnsafeMove :: PrimMonad m => MVector (PrimState m) (Identity a) -> MVector (PrimState m) (Identity a) -> m ()

basicUnsafeGrow :: PrimMonad m => MVector (PrimState m) (Identity a) -> Int -> m (MVector (PrimState m) (Identity a))

Unbox a => Vector Vector (Identity a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: PrimMonad m => Mutable Vector (PrimState m) (Identity a) -> m (Vector (Identity a))

basicUnsafeThaw :: PrimMonad m => Vector (Identity a) -> m (Mutable Vector (PrimState m) (Identity a))

basicLength :: Vector (Identity a) -> Int

basicUnsafeSlice :: Int -> Int -> Vector (Identity a) -> Vector (Identity a)

basicUnsafeIndexM :: Monad m => Vector (Identity a) -> Int -> m (Identity a)

basicUnsafeCopy :: PrimMonad m => Mutable Vector (PrimState m) (Identity a) -> Vector (Identity a) -> m ()

elemseq :: Vector (Identity a) -> Identity a -> b -> b

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

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 #

Floating a => Floating (Identity a)

Since: base-4.9.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

Num a => Num (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

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 #

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

Real a => Real (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

toRational :: Identity a -> Rational #

RealFloat a => RealFloat (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

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 #

Ix a => Ix (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

IsString a => IsString (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.String

Methods

fromString :: String -> Identity 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 #

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 #

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 #

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 () #

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

NFData a => NFData (Identity a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Identity a -> () #

FromJSON a => FromJSON (Identity a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Identity a) #

parseJSONList :: Value -> Parser [Identity a] #

FromJSONKey a => FromJSONKey (Identity a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction (Identity a)

fromJSONKeyList :: FromJSONKeyFunction [Identity a]

Hashable a => Hashable (Identity a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Identity a -> Int #

hash :: Identity a -> Int

ToJSON a => ToJSON (Identity a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Identity a -> Value

toEncoding :: Identity a -> Encoding

toJSONList :: [Identity a] -> Value

toEncodingList :: [Identity a] -> Encoding

ToJSONKey a => ToJSONKey (Identity a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction (Identity a)

toJSONKeyList :: ToJSONKeyFunction [Identity a]

Unbox a => Unbox (Identity a) 
Instance details

Defined in Data.Vector.Unboxed.Base

(TypeError (DisallowInstance "Identity") :: Constraint) => Container (Identity a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Identity a) :: Type #

Methods

toList :: Identity a -> [Element (Identity a)] #

null :: Identity a -> Bool #

foldr :: (Element (Identity a) -> b -> b) -> b -> Identity a -> b #

foldl :: (b -> Element (Identity a) -> b) -> b -> Identity a -> b #

foldl' :: (b -> Element (Identity a) -> b) -> b -> Identity a -> b #

length :: Identity a -> Int #

elem :: Element (Identity a) -> Identity a -> Bool #

maximum :: Identity a -> Element (Identity a) #

minimum :: Identity a -> Element (Identity a) #

foldMap :: Monoid m => (Element (Identity a) -> m) -> Identity a -> m #

fold :: Identity a -> Element (Identity a) #

foldr' :: (Element (Identity a) -> b -> b) -> b -> Identity a -> b #

foldr1 :: (Element (Identity a) -> Element (Identity a) -> Element (Identity a)) -> Identity a -> Element (Identity a) #

foldl1 :: (Element (Identity a) -> Element (Identity a) -> Element (Identity a)) -> Identity a -> Element (Identity a) #

notElem :: Element (Identity a) -> Identity a -> Bool #

all :: (Element (Identity a) -> Bool) -> Identity a -> Bool #

any :: (Element (Identity a) -> Bool) -> Identity a -> Bool #

and :: Identity a -> Bool #

or :: Identity a -> Bool #

find :: (Element (Identity a) -> Bool) -> Identity a -> Maybe (Element (Identity a)) #

safeHead :: Identity a -> Maybe (Element (Identity a)) #

Generic1 Identity 
Instance details

Defined in Data.Functor.Identity

Associated Types

type Rep1 Identity :: k -> Type #

Methods

from1 :: Identity a -> Rep1 Identity a #

to1 :: Rep1 Identity a -> Identity a #

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)))
newtype Vector (Identity a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector (Identity a) = V_Identity (Vector a)
type Element (Identity a) 
Instance details

Defined in Universum.Container.Class

type Element (Identity a) = ElementDefault (Identity a)
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))

stderr :: Handle #

A handle managing output to the Haskell program's standard error channel.

stdin :: Handle #

A handle managing input from the Haskell program's standard input channel.

registerDelay :: Int -> IO (TVar Bool) #

Switch the value of returned TVar from initial value False to True after a given number of microseconds. The caveats associated with threadDelay also apply.

withFrozenCallStack :: HasCallStack => (HasCallStack -> a) -> a #

Perform some computation without adding new entries to the CallStack.

Since: base-4.9.0.0

callStack :: HasCallStack -> CallStack #

Return the current CallStack.

Does *not* include the call-site of callStack.

Since: base-4.9.0.0

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.

newTVar :: a -> STM (TVar a) #

Create a new TVar holding a value supplied

data STM a #

A monad supporting atomic memory transactions.

Instances
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 #

fail :: String -> 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 #

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 #

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] #

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 :: Type

Methods

liftBaseWith :: (RunInBase STM STM -> STM a) -> STM a

restoreM :: StM STM a -> STM a

type StM STM a 
Instance details

Defined in Control.Monad.Trans.Control

type StM STM a = a

data TVar a #

Shared memory locations that support atomic memory transactions.

Instances
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 #

PrimUnlifted (TVar a) 
Instance details

Defined in Data.Primitive.UnliftedArray

stdout :: Handle #

A handle managing output to the Haskell program's standard output channel.

data IORef a #

A mutable variable in the IO monad

Instances
NFData1 IORef

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> IORef a -> () #

Eq (IORef a)

^ Pointer equality.

Since: base-4.1.0.0

Instance details

Defined in GHC.IORef

Methods

(==) :: IORef a -> IORef a -> Bool #

(/=) :: IORef a -> IORef a -> Bool #

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 -> () #

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.

prettyCallStack :: CallStack -> String #

Pretty print a CallStack.

Since: base-4.9.0.0

prettySrcLoc :: SrcLoc -> String #

Pretty print a SrcLoc.

Since: base-4.9.0.0

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
Exception Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Exception PatternMatchFail

Since: base-4.0

Instance details

Defined in Control.Exception.Base

Exception RecSelError

Since: base-4.0

Instance details

Defined in Control.Exception.Base

Exception RecConError

Since: base-4.0

Instance details

Defined in Control.Exception.Base

Exception RecUpdError

Since: base-4.0

Instance details

Defined in Control.Exception.Base

Exception NoMethodError

Since: base-4.0

Instance details

Defined in Control.Exception.Base

Exception TypeError

Since: base-4.9.0.0

Instance details

Defined in Control.Exception.Base

Exception NonTermination

Since: base-4.0

Instance details

Defined in Control.Exception.Base

Exception NestedAtomically

Since: base-4.0

Instance details

Defined in Control.Exception.Base

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 Deadlock

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Exception AllocationLimitExceeded

Since: base-4.8.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 AssertionFailed

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 AsyncException

Since: base-4.7.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 FixIOException

Since: base-4.11.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 IOException

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Exception ErrorCall

Since: base-4.0.0.0

Instance details

Defined in GHC.Exception

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 UnicodeException 
Instance details

Defined in Data.Text.Encoding.Error

Exception AsyncCancelled 
Instance details

Defined in Control.Concurrent.Async

Methods

toException :: AsyncCancelled -> SomeException #

fromException :: SomeException -> Maybe AsyncCancelled #

displayException :: AsyncCancelled -> String #

Exception ExceptionInLinkedThread 
Instance details

Defined in Control.Concurrent.Async

Methods

toException :: ExceptionInLinkedThread -> SomeException #

fromException :: SomeException -> Maybe ExceptionInLinkedThread #

displayException :: ExceptionInLinkedThread -> String #

Exception OnlyUniqueException 
Instance details

Defined in Database.Persist.Types.Base

Methods

toException :: OnlyUniqueException -> SomeException #

fromException :: SomeException -> Maybe OnlyUniqueException #

displayException :: OnlyUniqueException -> String #

Exception PersistException 
Instance details

Defined in Database.Persist.Types.Base

Methods

toException :: PersistException -> SomeException #

fromException :: SomeException -> Maybe PersistException #

displayException :: PersistException -> String #

Exception UpdateException 
Instance details

Defined in Database.Persist.Types.Base

Methods

toException :: UpdateException -> SomeException #

fromException :: SomeException -> Maybe UpdateException #

displayException :: UpdateException -> String #

Exception Bug 
Instance details

Defined in Universum.Exception

Exception ConcException 
Instance details

Defined in UnliftIO.Internals.Async

Methods

toException :: ConcException -> SomeException #

fromException :: SomeException -> Maybe ConcException #

displayException :: ConcException -> String #

Exception InvalidAccess 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

toException :: InvalidAccess -> SomeException #

fromException :: SomeException -> Maybe InvalidAccess #

displayException :: InvalidAccess -> String #

Exception ResourceCleanupException 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

toException :: ResourceCleanupException -> SomeException #

fromException :: SomeException -> Maybe ResourceCleanupException #

displayException :: ResourceCleanupException -> String #

Exception AsyncExceptionWrapper 
Instance details

Defined in Control.Exception.Safe

Methods

toException :: AsyncExceptionWrapper -> SomeException #

fromException :: SomeException -> Maybe AsyncExceptionWrapper #

displayException :: AsyncExceptionWrapper -> String #

Exception StringException 
Instance details

Defined in Control.Exception.Safe

Methods

toException :: StringException -> SomeException #

fromException :: SomeException -> Maybe StringException #

displayException :: StringException -> String #

Exception SyncExceptionWrapper 
Instance details

Defined in Control.Exception.Safe

Methods

toException :: SyncExceptionWrapper -> SomeException #

fromException :: SomeException -> Maybe SyncExceptionWrapper #

displayException :: SyncExceptionWrapper -> String #

Exception ClientError 
Instance details

Defined in Network.HTTP2.Client.Exceptions

Methods

toException :: ClientError -> SomeException #

fromException :: SomeException -> Maybe ClientError #

displayException :: ClientError -> String #

Exception LndError Source # 
Instance details

Defined in LndClient.Data.Type

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 CryptoError 
Instance details

Defined in Crypto.Error.Types

Methods

toException :: CryptoError -> SomeException #

fromException :: SomeException -> Maybe CryptoError #

displayException :: CryptoError -> String #

Exception RemoteSentGoAwayFrame 
Instance details

Defined in Network.HTTP2.Client.Dispatch

Methods

toException :: RemoteSentGoAwayFrame -> SomeException #

fromException :: SomeException -> Maybe RemoteSentGoAwayFrame #

displayException :: RemoteSentGoAwayFrame -> String #

Exception HTTP2Error 
Instance details

Defined in Network.HTTP2.Types

Methods

toException :: HTTP2Error -> SomeException #

fromException :: SomeException -> Maybe HTTP2Error #

displayException :: HTTP2Error -> String #

Exception GRPCStatus 
Instance details

Defined in Network.GRPC.HTTP2.Types

Methods

toException :: GRPCStatus -> SomeException #

fromException :: SomeException -> Maybe GRPCStatus #

displayException :: GRPCStatus -> String #

Exception InvalidGRPCStatus 
Instance details

Defined in Network.GRPC.HTTP2.Types

Methods

toException :: InvalidGRPCStatus -> SomeException #

fromException :: SomeException -> Maybe InvalidGRPCStatus #

displayException :: InvalidGRPCStatus -> String #

Exception DecodeError 
Instance details

Defined in Network.HPACK.Types

Methods

toException :: DecodeError -> SomeException #

fromException :: SomeException -> Maybe DecodeError #

displayException :: DecodeError -> String #

Exception InvalidParse 
Instance details

Defined in Network.GRPC.Client

Methods

toException :: InvalidParse -> SomeException #

fromException :: SomeException -> Maybe InvalidParse #

displayException :: InvalidParse -> String #

Exception InvalidState 
Instance details

Defined in Network.GRPC.Client

Methods

toException :: InvalidState -> SomeException #

fromException :: SomeException -> Maybe InvalidState #

displayException :: InvalidState -> String #

Exception StreamReplyDecodingError 
Instance details

Defined in Network.GRPC.Client

Methods

toException :: StreamReplyDecodingError -> SomeException #

fromException :: SomeException -> Maybe StreamReplyDecodingError #

displayException :: StreamReplyDecodingError -> String #

Exception UnallowedPushPromiseReceived 
Instance details

Defined in Network.GRPC.Client

Methods

toException :: UnallowedPushPromiseReceived -> SomeException #

fromException :: SomeException -> Maybe UnallowedPushPromiseReceived #

displayException :: UnallowedPushPromiseReceived -> String #

Exception BitcoinException 
Instance details

Defined in Network.Bitcoin.Types

Methods

toException :: BitcoinException -> SomeException #

fromException :: SomeException -> Maybe BitcoinException #

displayException :: BitcoinException -> String #

Exception HttpException 
Instance details

Defined in Network.HTTP.Client.Types

Methods

toException :: HttpException -> SomeException #

fromException :: SomeException -> Maybe HttpException #

displayException :: HttpException -> String #

Exception HttpExceptionContentWrapper 
Instance details

Defined in Network.HTTP.Client.Types

Methods

toException :: HttpExceptionContentWrapper -> SomeException #

fromException :: SomeException -> Maybe HttpExceptionContentWrapper #

displayException :: HttpExceptionContentWrapper -> String #

newtype Const a (b :: k) :: forall k. Type -> k -> Type #

The Const functor.

Constructors

Const 

Fields

Instances
Generic1 (Const a :: k -> Type) 
Instance details

Defined in Data.Functor.Const

Associated Types

type Rep1 (Const a) :: k -> Type #

Methods

from1 :: Const a a0 -> Rep1 (Const a) a0 #

to1 :: Rep1 (Const a) a0 -> Const a a0 #

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 :: PrimMonad m => Int -> m (MVector (PrimState m) (Const a b))

basicInitialize :: PrimMonad m => MVector (PrimState m) (Const a b) -> m ()

basicUnsafeReplicate :: PrimMonad m => Int -> Const a b -> m (MVector (PrimState m) (Const a b))

basicUnsafeRead :: PrimMonad m => MVector (PrimState m) (Const a b) -> Int -> m (Const a b)

basicUnsafeWrite :: PrimMonad m => MVector (PrimState m) (Const a b) -> Int -> Const a b -> m ()

basicClear :: PrimMonad m => MVector (PrimState m) (Const a b) -> m ()

basicSet :: PrimMonad m => MVector (PrimState m) (Const a b) -> Const a b -> m ()

basicUnsafeCopy :: PrimMonad m => MVector (PrimState m) (Const a b) -> MVector (PrimState m) (Const a b) -> m ()

basicUnsafeMove :: PrimMonad m => MVector (PrimState m) (Const a b) -> MVector (PrimState m) (Const a b) -> m ()

basicUnsafeGrow :: PrimMonad m => MVector (PrimState m) (Const a b) -> Int -> m (MVector (PrimState m) (Const a b))

Unbox a => Vector Vector (Const a b) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: PrimMonad m => Mutable Vector (PrimState m) (Const a b) -> m (Vector (Const a b))

basicUnsafeThaw :: PrimMonad m => Vector (Const a b) -> m (Mutable Vector (PrimState m) (Const a b))

basicLength :: Vector (Const a b) -> Int

basicUnsafeSlice :: Int -> Int -> Vector (Const a b) -> Vector (Const a b)

basicUnsafeIndexM :: Monad m => Vector (Const a b) -> Int -> m (Const a b)

basicUnsafeCopy :: PrimMonad m => Mutable Vector (PrimState m) (Const a b) -> Vector (Const a b) -> m ()

elemseq :: Vector (Const a b) -> Const a b -> b0 -> b0

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 #

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 -> 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 #

NFData2 (Const :: Type -> Type -> Type)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf2 :: (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 -> 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

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

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 #

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 #

Foldable (Const m :: Type -> 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 #

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 #

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) #

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 -> 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 #

NFData a => NFData1 (Const a :: Type -> Type)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (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 -> 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

Hashable a => Hashable1 (Const a :: Type -> Type) 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a0 -> Int) -> Int -> Const a a0 -> Int

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] #

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 #

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 #

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 #

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 #

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 #

Read a => Read (Const a b)

This instance would be equivalent to the derived instances of the Const newtype if the runConst field were removed

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Const

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 #

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 #

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 runConst 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 #

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

IsString a => IsString (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.String

Methods

fromString :: String -> 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 #

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 #

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 #

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 () #

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

NFData a => NFData (Const a b)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Const a b -> () #

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] #

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

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

Unbox a => Unbox (Const a b) 
Instance details

Defined in Data.Vector.Unboxed.Base

Container (Const a b) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Const a b) :: Type #

Methods

toList :: Const a b -> [Element (Const a b)] #

null :: Const a b -> Bool #

foldr :: (Element (Const a b) -> b0 -> b0) -> b0 -> Const a b -> b0 #

foldl :: (b0 -> Element (Const a b) -> b0) -> b0 -> Const a b -> b0 #

foldl' :: (b0 -> Element (Const a b) -> b0) -> b0 -> Const a b -> b0 #

length :: Const a b -> Int #

elem :: Element (Const a b) -> Const a b -> Bool #

maximum :: Const a b -> Element (Const a b) #

minimum :: Const a b -> Element (Const a b) #

foldMap :: Monoid m => (Element (Const a b) -> m) -> Const a b -> m #

fold :: Const a b -> Element (Const a b) #

foldr' :: (Element (Const a b) -> b0 -> b0) -> b0 -> Const a b -> b0 #

foldr1 :: (Element (Const a b) -> Element (Const a b) -> Element (Const a b)) -> Const a b -> Element (Const a b) #

foldl1 :: (Element (Const a b) -> Element (Const a b) -> Element (Const a b)) -> Const a b -> Element (Const a b) #

notElem :: Element (Const a b) -> Const a b -> Bool #

all :: (Element (Const a b) -> Bool) -> Const a b -> Bool #

any :: (Element (Const a b) -> Bool) -> Const a b -> Bool #

and :: Const a b -> Bool #

or :: Const a b -> Bool #

find :: (Element (Const a b) -> Bool) -> Const a b -> Maybe (Element (Const a b)) #

safeHead :: Const a b -> Maybe (Element (Const a b)) #

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)))
newtype Vector (Const a b) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector (Const a b) = V_Const (Vector a)
type Element (Const a b) 
Instance details

Defined in Universum.Container.Class

type Element (Const a b) = ElementDefault (Const a b)

minimumBy :: Foldable t => (a -> a -> Ordering) -> t a -> a #

The least element of a non-empty structure with respect to the given comparison function.

maximumBy :: Foldable t => (a -> a -> Ordering) -> t a -> a #

The largest element of a non-empty structure with respect to the given comparison function.

concatMap :: Foldable t => (a -> [b]) -> t a -> [b] #

Map a function over all the elements of a container and concatenate the resulting lists.

concat :: Foldable t => t [a] -> [a] #

The concatenation of all the elements of a container of lists.

foldlM :: (Foldable t, Monad m) => (b -> a -> m b) -> b -> t a -> m b #

Monadic fold over the elements of a structure, associating to the left, i.e. from left to right.

foldrM :: (Foldable t, Monad m) => (a -> b -> m b) -> b -> t a -> m b #

Monadic fold over the elements of a structure, associating to the right, i.e. from right to left.

newtype First a #

Maybe monoid returning the leftmost non-Nothing value.

First a is isomorphic to Alt Maybe a, but precedes it historically.

>>> getFirst (First (Just "hello") <> First Nothing <> First (Just "world"))
Just "hello"

Use of this type is discouraged. Note the following equivalence:

Data.Monoid.First x === Maybe (Data.Semigroup.First x)

In addition to being equivalent in the structural sense, the two also have Monoid instances that behave the same. This type will be marked deprecated in GHC 8.8, and removed in GHC 8.10. Users are advised to use the variant from Data.Semigroup and wrap it in Maybe.

Constructors

First 

Fields

Instances
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 #

fail :: String -> First 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 #

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 #

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 #

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 #

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) #

NFData1 First

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> First a -> () #

FromJSON1 First 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (First a)

liftParseJSONList :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [First a]

ToJSON1 First 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Value) -> ([a] -> Value) -> First a -> Value

liftToJSONList :: (a -> Value) -> ([a] -> Value) -> [First a] -> Value

liftToEncoding :: (a -> Encoding) -> ([a] -> Encoding) -> First a -> Encoding

liftToEncodingList :: (a -> Encoding) -> ([a] -> Encoding) -> [First a] -> Encoding

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 #

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 #

Read a => Read (First a)

Since: base-2.1

Instance details

Defined in Data.Monoid

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 #

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 #

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 #

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 #

NFData a => NFData (First a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: First a -> () #

FromJSON a => FromJSON (First a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (First a) #

parseJSONList :: Value -> Parser [First a] #

ToJSON a => ToJSON (First a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: First a -> Value

toEncoding :: First a -> Encoding

toJSONList :: [First a] -> Value

toEncodingList :: [First a] -> Encoding

Container (First a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (First a) :: Type #

Methods

toList :: First a -> [Element (First a)] #

null :: First a -> Bool #

foldr :: (Element (First a) -> b -> b) -> b -> First a -> b #

foldl :: (b -> Element (First a) -> b) -> b -> First a -> b #

foldl' :: (b -> Element (First a) -> b) -> b -> First a -> b #

length :: First a -> Int #

elem :: Element (First a) -> First a -> Bool #

maximum :: First a -> Element (First a) #

minimum :: First a -> Element (First a) #

foldMap :: Monoid m => (Element (First a) -> m) -> First a -> m #

fold :: First a -> Element (First a) #

foldr' :: (Element (First a) -> b -> b) -> b -> First a -> b #

foldr1 :: (Element (First a) -> Element (First a) -> Element (First a)) -> First a -> Element (First a) #

foldl1 :: (Element (First a) -> Element (First a) -> Element (First a)) -> First a -> Element (First a) #

notElem :: Element (First a) -> First a -> Bool #

all :: (Element (First a) -> Bool) -> First a -> Bool #

any :: (Element (First a) -> Bool) -> First a -> Bool #

and :: First a -> Bool #

or :: First a -> Bool #

find :: (Element (First a) -> Bool) -> First a -> Maybe (Element (First a)) #

safeHead :: First a -> Maybe (Element (First a)) #

Generic1 First 
Instance details

Defined in Data.Monoid

Associated Types

type Rep1 First :: k -> Type #

Methods

from1 :: First a -> Rep1 First a #

to1 :: Rep1 First a -> First a #

type Rep (First a)

Since: base-4.7.0.0

Instance details

Defined in Data.Monoid

type Rep (First a) = D1 (MetaData "First" "Data.Monoid" "base" True) (C1 (MetaCons "First" PrefixI True) (S1 (MetaSel (Just "getFirst") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe a))))
type Element (First a) 
Instance details

Defined in Universum.Container.Class

type Element (First a) = ElementDefault (First a)
type Rep1 First

Since: base-4.7.0.0

Instance details

Defined in Data.Monoid

type Rep1 First = D1 (MetaData "First" "Data.Monoid" "base" True) (C1 (MetaCons "First" PrefixI True) (S1 (MetaSel (Just "getFirst") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 Maybe)))

newtype Last a #

Maybe monoid returning the rightmost non-Nothing value.

Last a is isomorphic to Dual (First a), and thus to Dual (Alt Maybe a)

>>> getLast (Last (Just "hello") <> Last Nothing <> Last (Just "world"))
Just "world"

Use of this type is discouraged. Note the following equivalence:

Data.Monoid.Last x === Maybe (Data.Semigroup.Last x)

In addition to being equivalent in the structural sense, the two also have Monoid instances that behave the same. This type will be marked deprecated in GHC 8.8, and removed in GHC 8.10. Users are advised to use the variant from Data.Semigroup and wrap it in Maybe.

Constructors

Last 

Fields

Instances
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 #

fail :: String -> Last 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 #

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 #

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 #

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 #

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) #

NFData1 Last

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> Last a -> () #

FromJSON1 Last 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (Last a)

liftParseJSONList :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [Last a]

ToJSON1 Last 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Value) -> ([a] -> Value) -> Last a -> Value

liftToJSONList :: (a -> Value) -> ([a] -> Value) -> [Last a] -> Value

liftToEncoding :: (a -> Encoding) -> ([a] -> Encoding) -> Last a -> Encoding

liftToEncodingList :: (a -> Encoding) -> ([a] -> Encoding) -> [Last a] -> Encoding

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 #

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 #

Read a => Read (Last a)

Since: base-2.1

Instance details

Defined in Data.Monoid

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 #

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 #

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 #

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 #

NFData a => NFData (Last a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Last a -> () #

FromJSON a => FromJSON (Last a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Last a) #

parseJSONList :: Value -> Parser [Last a] #

ToJSON a => ToJSON (Last a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Last a -> Value

toEncoding :: Last a -> Encoding

toJSONList :: [Last a] -> Value

toEncodingList :: [Last a] -> Encoding

Container (Last a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Last a) :: Type #

Methods

toList :: Last a -> [Element (Last a)] #

null :: Last a -> Bool #

foldr :: (Element (Last a) -> b -> b) -> b -> Last a -> b #

foldl :: (b -> Element (Last a) -> b) -> b -> Last a -> b #

foldl' :: (b -> Element (Last a) -> b) -> b -> Last a -> b #

length :: Last a -> Int #

elem :: Element (Last a) -> Last a -> Bool #

maximum :: Last a -> Element (Last a) #

minimum :: Last a -> Element (Last a) #

foldMap :: Monoid m => (Element (Last a) -> m) -> Last a -> m #

fold :: Last a -> Element (Last a) #

foldr' :: (Element (Last a) -> b -> b) -> b -> Last a -> b #

foldr1 :: (Element (Last a) -> Element (Last a) -> Element (Last a)) -> Last a -> Element (Last a) #

foldl1 :: (Element (Last a) -> Element (Last a) -> Element (Last a)) -> Last a -> Element (Last a) #

notElem :: Element (Last a) -> Last a -> Bool #

all :: (Element (Last a) -> Bool) -> Last a -> Bool #

any :: (Element (Last a) -> Bool) -> Last a -> Bool #

and :: Last a -> Bool #

or :: Last a -> Bool #

find :: (Element (Last a) -> Bool) -> Last a -> Maybe (Element (Last a)) #

safeHead :: Last a -> Maybe (Element (Last a)) #

Generic1 Last 
Instance details

Defined in Data.Monoid

Associated Types

type Rep1 Last :: k -> Type #

Methods

from1 :: Last a -> Rep1 Last a #

to1 :: Rep1 Last a -> Last a #

type Rep (Last a)

Since: base-4.7.0.0

Instance details

Defined in Data.Monoid

type Rep (Last a) = D1 (MetaData "Last" "Data.Monoid" "base" True) (C1 (MetaCons "Last" PrefixI True) (S1 (MetaSel (Just "getLast") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe a))))
type Element (Last a) 
Instance details

Defined in Universum.Container.Class

type Element (Last a) = ElementDefault (Last a)
type Rep1 Last

Since: base-4.7.0.0

Instance details

Defined in Data.Monoid

type Rep1 Last = D1 (MetaData "Last" "Data.Monoid" "base" True) (C1 (MetaCons "Last" PrefixI True) (S1 (MetaSel (Just "getLast") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 Maybe)))

stimesMonoid :: (Integral b, Monoid a) => b -> a -> a #

This is a valid definition of stimes for a Monoid.

Unlike the default definition of stimes, it is defined for 0 and so it should be preferred where possible.

stimesIdempotent :: Integral b => b -> a -> a #

This is a valid definition of stimes for an idempotent Semigroup.

When x <> x = x, this definition should be preferred, because it works in O(1) rather than O(log n).

newtype Dual a #

The dual of a Monoid, obtained by swapping the arguments of mappend.

>>> getDual (mappend (Dual "Hello") (Dual "World"))
"WorldHello"

Constructors

Dual 

Fields

Instances
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 #

fail :: String -> Dual 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 #

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 #

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 #

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 #

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) #

NFData1 Dual

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> Dual a -> () #

FromJSON1 Dual 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (Dual a)

liftParseJSONList :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [Dual a]

ToJSON1 Dual 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Value) -> ([a] -> Value) -> Dual a -> Value

liftToJSONList :: (a -> Value) -> ([a] -> Value) -> [Dual a] -> Value

liftToEncoding :: (a -> Encoding) -> ([a] -> Encoding) -> Dual a -> Encoding

liftToEncodingList :: (a -> Encoding) -> ([a] -> Encoding) -> [Dual a] -> Encoding

Unbox a => MVector MVector (Dual a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s (Dual a) -> Int

basicUnsafeSlice :: Int -> Int -> MVector s (Dual a) -> MVector s (Dual a)

basicOverlaps :: MVector s (Dual a) -> MVector s (Dual a) -> Bool

basicUnsafeNew :: PrimMonad m => Int -> m (MVector (PrimState m) (Dual a))

basicInitialize :: PrimMonad m => MVector (PrimState m) (Dual a) -> m ()

basicUnsafeReplicate :: PrimMonad m => Int -> Dual a -> m (MVector (PrimState m) (Dual a))

basicUnsafeRead :: PrimMonad m => MVector (PrimState m) (Dual a) -> Int -> m (Dual a)

basicUnsafeWrite :: PrimMonad m => MVector (PrimState m) (Dual a) -> Int -> Dual a -> m ()

basicClear :: PrimMonad m => MVector (PrimState m) (Dual a) -> m ()

basicSet :: PrimMonad m => MVector (PrimState m) (Dual a) -> Dual a -> m ()

basicUnsafeCopy :: PrimMonad m => MVector (PrimState m) (Dual a) -> MVector (PrimState m) (Dual a) -> m ()

basicUnsafeMove :: PrimMonad m => MVector (PrimState m) (Dual a) -> MVector (PrimState m) (Dual a) -> m ()

basicUnsafeGrow :: PrimMonad m => MVector (PrimState m) (Dual a) -> Int -> m (MVector (PrimState m) (Dual a))

Unbox a => Vector Vector (Dual a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: PrimMonad m => Mutable Vector (PrimState m) (Dual a) -> m (Vector (Dual a))

basicUnsafeThaw :: PrimMonad m => Vector (Dual a) -> m (Mutable Vector (PrimState m) (Dual a))

basicLength :: Vector (Dual a) -> Int

basicUnsafeSlice :: Int -> Int -> Vector (Dual a) -> Vector (Dual a)

basicUnsafeIndexM :: Monad m => Vector (Dual a) -> Int -> m (Dual a)

basicUnsafeCopy :: PrimMonad m => Mutable Vector (PrimState m) (Dual a) -> Vector (Dual a) -> m ()

elemseq :: Vector (Dual a) -> Dual a -> b -> b

Bounded a => Bounded (Dual a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

minBound :: Dual a #

maxBound :: Dual a #

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 #

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 #

Read a => Read (Dual a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

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 #

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 #

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 #

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 #

NFData a => NFData (Dual a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Dual a -> () #

FromJSON a => FromJSON (Dual a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Dual a) #

parseJSONList :: Value -> Parser [Dual a] #

ToJSON a => ToJSON (Dual a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Dual a -> Value

toEncoding :: Dual a -> Encoding

toJSONList :: [Dual a] -> Value

toEncodingList :: [Dual a] -> Encoding

Unbox a => Unbox (Dual a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Container (Dual a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Dual a) :: Type #

Methods

toList :: Dual a -> [Element (Dual a)] #

null :: Dual a -> Bool #

foldr :: (Element (Dual a) -> b -> b) -> b -> Dual a -> b #

foldl :: (b -> Element (Dual a) -> b) -> b -> Dual a -> b #

foldl' :: (b -> Element (Dual a) -> b) -> b -> Dual a -> b #

length :: Dual a -> Int #

elem :: Element (Dual a) -> Dual a -> Bool #

maximum :: Dual a -> Element (Dual a) #

minimum :: Dual a -> Element (Dual a) #

foldMap :: Monoid m => (Element (Dual a) -> m) -> Dual a -> m #

fold :: Dual a -> Element (Dual a) #

foldr' :: (Element (Dual a) -> b -> b) -> b -> Dual a -> b #

foldr1 :: (Element (Dual a) -> Element (Dual a) -> Element (Dual a)) -> Dual a -> Element (Dual a) #

foldl1 :: (Element (Dual a) -> Element (Dual a) -> Element (Dual a)) -> Dual a -> Element (Dual a) #

notElem :: Element (Dual a) -> Dual a -> Bool #

all :: (Element (Dual a) -> Bool) -> Dual a -> Bool #

any :: (Element (Dual a) -> Bool) -> Dual a -> Bool #

and :: Dual a -> Bool #

or :: Dual a -> Bool #

find :: (Element (Dual a) -> Bool) -> Dual a -> Maybe (Element (Dual a)) #

safeHead :: Dual a -> Maybe (Element (Dual a)) #

Generic1 Dual 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep1 Dual :: k -> Type #

Methods

from1 :: Dual a -> Rep1 Dual a #

to1 :: Rep1 Dual a -> Dual a #

newtype MVector s (Dual a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s (Dual a) = MV_Dual (MVector s a)
type Rep (Dual a)

Since: base-4.7.0.0

Instance details

Defined in Data.Semigroup.Internal

type Rep (Dual a) = D1 (MetaData "Dual" "Data.Semigroup.Internal" "base" True) (C1 (MetaCons "Dual" PrefixI True) (S1 (MetaSel (Just "getDual") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
newtype Vector (Dual a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector (Dual a) = V_Dual (Vector a)
type Element (Dual a) 
Instance details

Defined in Universum.Container.Class

type Element (Dual a) = ElementDefault (Dual a)
type Rep1 Dual

Since: base-4.7.0.0

Instance details

Defined in Data.Semigroup.Internal

type Rep1 Dual = D1 (MetaData "Dual" "Data.Semigroup.Internal" "base" True) (C1 (MetaCons "Dual" PrefixI True) (S1 (MetaSel (Just "getDual") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype Endo a #

The monoid of endomorphisms under composition.

>>> let computation = Endo ("Hello, " ++) <> Endo (++ "!")
>>> appEndo computation "Haskell"
"Hello, Haskell!"

Constructors

Endo 

Fields

Instances
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 #

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 #

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 #

type Rep (Endo a)

Since: base-4.7.0.0

Instance details

Defined in Data.Semigroup.Internal

type Rep (Endo a) = D1 (MetaData "Endo" "Data.Semigroup.Internal" "base" True) (C1 (MetaCons "Endo" PrefixI True) (S1 (MetaSel (Just "appEndo") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (a -> a))))

newtype All #

Boolean monoid under conjunction (&&).

>>> getAll (All True <> mempty <> All False)
False
>>> getAll (mconcat (map (\x -> All (even x)) [2,4,6,7,8]))
False

Constructors

All 

Fields

Instances
Bounded All

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

minBound :: All #

maxBound :: All #

Eq All

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

(==) :: All -> All -> Bool #

(/=) :: All -> All -> Bool #

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 #

Read All

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Show All

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

showsPrec :: Int -> All -> ShowS #

show :: All -> String #

showList :: [All] -> ShowS #

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 #

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 #

Monoid All

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

mempty :: All #

mappend :: All -> All -> All #

mconcat :: [All] -> All #

NFData All

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: All -> () #

Unbox All 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector All 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s All -> Int

basicUnsafeSlice :: Int -> Int -> MVector s All -> MVector s All

basicOverlaps :: MVector s All -> MVector s All -> Bool

basicUnsafeNew :: PrimMonad m => Int -> m (MVector (PrimState m) All)

basicInitialize :: PrimMonad m => MVector (PrimState m) All -> m ()

basicUnsafeReplicate :: PrimMonad m => Int -> All -> m (MVector (PrimState m) All)

basicUnsafeRead :: PrimMonad m => MVector (PrimState m) All -> Int -> m All

basicUnsafeWrite :: PrimMonad m => MVector (PrimState m) All -> Int -> All -> m ()

basicClear :: PrimMonad m => MVector (PrimState m) All -> m ()

basicSet :: PrimMonad m => MVector (PrimState m) All -> All -> m ()

basicUnsafeCopy :: PrimMonad m => MVector (PrimState m) All -> MVector (PrimState m) All -> m ()

basicUnsafeMove :: PrimMonad m => MVector (PrimState m) All -> MVector (PrimState m) All -> m ()

basicUnsafeGrow :: PrimMonad m => MVector (PrimState m) All -> Int -> m (MVector (PrimState m) All)

Vector Vector All 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: PrimMonad m => Mutable Vector (PrimState m) All -> m (Vector All)

basicUnsafeThaw :: PrimMonad m => Vector All -> m (Mutable Vector (PrimState m) All)

basicLength :: Vector All -> Int

basicUnsafeSlice :: Int -> Int -> Vector All -> Vector All

basicUnsafeIndexM :: Monad m => Vector All -> Int -> m All

basicUnsafeCopy :: PrimMonad m => Mutable Vector (PrimState m) All -> Vector All -> m ()

elemseq :: Vector All -> All -> b -> b

type Rep All

Since: base-4.7.0.0

Instance details

Defined in Data.Semigroup.Internal

type Rep All = D1 (MetaData "All" "Data.Semigroup.Internal" "base" True) (C1 (MetaCons "All" PrefixI True) (S1 (MetaSel (Just "getAll") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Bool)))
newtype Vector All 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector All = V_All (Vector Bool)
newtype MVector s All 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s All = MV_All (MVector s Bool)

newtype Any #

Boolean monoid under disjunction (||).

>>> getAny (Any True <> mempty <> Any False)
True
>>> getAny (mconcat (map (\x -> Any (even x)) [2,4,6,7,8]))
True

Constructors

Any 

Fields

Instances
Bounded Any

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

minBound :: Any #

maxBound :: Any #

Eq Any

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

(==) :: Any -> Any -> Bool #

(/=) :: Any -> Any -> Bool #

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 #

Read Any

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Show Any

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

showsPrec :: Int -> Any -> ShowS #

show :: Any -> String #

showList :: [Any] -> ShowS #

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 #

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 #

Monoid Any

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

mempty :: Any #

mappend :: Any -> Any -> Any #

mconcat :: [Any] -> Any #

NFData Any

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Any -> () #

Unbox Any 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Any 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s Any -> Int

basicUnsafeSlice :: Int -> Int -> MVector s Any -> MVector s Any

basicOverlaps :: MVector s Any -> MVector s Any -> Bool

basicUnsafeNew :: PrimMonad m => Int -> m (MVector (PrimState m) Any)

basicInitialize :: PrimMonad m => MVector (PrimState m) Any -> m ()

basicUnsafeReplicate :: PrimMonad m => Int -> Any -> m (MVector (PrimState m) Any)

basicUnsafeRead :: PrimMonad m => MVector (PrimState m) Any -> Int -> m Any

basicUnsafeWrite :: PrimMonad m => MVector (PrimState m) Any -> Int -> Any -> m ()

basicClear :: PrimMonad m => MVector (PrimState m) Any -> m ()

basicSet :: PrimMonad m => MVector (PrimState m) Any -> Any -> m ()

basicUnsafeCopy :: PrimMonad m => MVector (PrimState m) Any -> MVector (PrimState m) Any -> m ()

basicUnsafeMove :: PrimMonad m => MVector (PrimState m) Any -> MVector (PrimState m) Any -> m ()

basicUnsafeGrow :: PrimMonad m => MVector (PrimState m) Any -> Int -> m (MVector (PrimState m) Any)

Vector Vector Any 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: PrimMonad m => Mutable Vector (PrimState m) Any -> m (Vector Any)

basicUnsafeThaw :: PrimMonad m => Vector Any -> m (Mutable Vector (PrimState m) Any)

basicLength :: Vector Any -> Int

basicUnsafeSlice :: Int -> Int -> Vector Any -> Vector Any

basicUnsafeIndexM :: Monad m => Vector Any -> Int -> m Any

basicUnsafeCopy :: PrimMonad m => Mutable Vector (PrimState m) Any -> Vector Any -> m ()

elemseq :: Vector Any -> Any -> b -> b

type Rep Any

Since: base-4.7.0.0

Instance details

Defined in Data.Semigroup.Internal

type Rep Any = D1 (MetaData "Any" "Data.Semigroup.Internal" "base" True) (C1 (MetaCons "Any" PrefixI True) (S1 (MetaSel (Just "getAny") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Bool)))
newtype Vector Any 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector Any = V_Any (Vector Bool)
newtype MVector s Any 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Any = MV_Any (MVector s Bool)

newtype Sum a #

Monoid under addition.

>>> getSum (Sum 1 <> Sum 2 <> mempty)
3

Constructors

Sum 

Fields

Instances
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 #

fail :: String -> Sum 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 #

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 #

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 #

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 #

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) #

NFData1 Sum

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> Sum a -> () #

Unbox a => MVector MVector (Sum a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s (Sum a) -> Int

basicUnsafeSlice :: Int -> Int -> MVector s (Sum a) -> MVector s (Sum a)

basicOverlaps :: MVector s (Sum a) -> MVector s (Sum a) -> Bool

basicUnsafeNew :: PrimMonad m => Int -> m (MVector (PrimState m) (Sum a))

basicInitialize :: PrimMonad m => MVector (PrimState m) (Sum a) -> m ()

basicUnsafeReplicate :: PrimMonad m => Int -> Sum a -> m (MVector (PrimState m) (Sum a))

basicUnsafeRead :: PrimMonad m => MVector (PrimState m) (Sum a) -> Int -> m (Sum a)

basicUnsafeWrite :: PrimMonad m => MVector (PrimState m) (Sum a) -> Int -> Sum a -> m ()

basicClear :: PrimMonad m => MVector (PrimState m) (Sum a) -> m ()

basicSet :: PrimMonad m => MVector (PrimState m) (Sum a) -> Sum a -> m ()

basicUnsafeCopy :: PrimMonad m => MVector (PrimState m) (Sum a) -> MVector (PrimState m) (Sum a) -> m ()

basicUnsafeMove :: PrimMonad m => MVector (PrimState m) (Sum a) -> MVector (PrimState m) (Sum a) -> m ()

basicUnsafeGrow :: PrimMonad m => MVector (PrimState m) (Sum a) -> Int -> m (MVector (PrimState m) (Sum a))

Unbox a => Vector Vector (Sum a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: PrimMonad m => Mutable Vector (PrimState m) (Sum a) -> m (Vector (Sum a))

basicUnsafeThaw :: PrimMonad m => Vector (Sum a) -> m (Mutable Vector (PrimState m) (Sum a))

basicLength :: Vector (Sum a) -> Int

basicUnsafeSlice :: Int -> Int -> Vector (Sum a) -> Vector (Sum a)

basicUnsafeIndexM :: Monad m => Vector (Sum a) -> Int -> m (Sum a)

basicUnsafeCopy :: PrimMonad m => Mutable Vector (PrimState m) (Sum a) -> Vector (Sum a) -> m ()

elemseq :: Vector (Sum a) -> Sum a -> b -> b

Bounded a => Bounded (Sum a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

minBound :: Sum a #

maxBound :: Sum a #

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 #

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 #

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 #

Read a => Read (Sum a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

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 #

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 #

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 #

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 #

NFData a => NFData (Sum a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Sum a -> () #

Unbox a => Unbox (Sum a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Container (Sum a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Sum a) :: Type #

Methods

toList :: Sum a -> [Element (Sum a)] #

null :: Sum a -> Bool #

foldr :: (Element (Sum a) -> b -> b) -> b -> Sum a -> b #

foldl :: (b -> Element (Sum a) -> b) -> b -> Sum a -> b #

foldl' :: (b -> Element (Sum a) -> b) -> b -> Sum a -> b #

length :: Sum a -> Int #

elem :: Element (Sum a) -> Sum a -> Bool #

maximum :: Sum a -> Element (Sum a) #

minimum :: Sum a -> Element (Sum a) #

foldMap :: Monoid m => (Element (Sum a) -> m) -> Sum a -> m #

fold :: Sum a -> Element (Sum a) #

foldr' :: (Element (Sum a) -> b -> b) -> b -> Sum a -> b #

foldr1 :: (Element (Sum a) -> Element (Sum a) -> Element (Sum a)) -> Sum a -> Element (Sum a) #

foldl1 :: (Element (Sum a) -> Element (Sum a) -> Element (Sum a)) -> Sum a -> Element (Sum a) #

notElem :: Element (Sum a) -> Sum a -> Bool #

all :: (Element (Sum a) -> Bool) -> Sum a -> Bool #

any :: (Element (Sum a) -> Bool) -> Sum a -> Bool #

and :: Sum a -> Bool #

or :: Sum a -> Bool #

find :: (Element (Sum a) -> Bool) -> Sum a -> Maybe (Element (Sum a)) #

safeHead :: Sum a -> Maybe (Element (Sum a)) #

Generic1 Sum 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep1 Sum :: k -> Type #

Methods

from1 :: Sum a -> Rep1 Sum a #

to1 :: Rep1 Sum a -> Sum a #

newtype MVector s (Sum a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s (Sum a) = MV_Sum (MVector s a)
type Rep (Sum a)

Since: base-4.7.0.0

Instance details

Defined in Data.Semigroup.Internal

type Rep (Sum a) = D1 (MetaData "Sum" "Data.Semigroup.Internal" "base" True) (C1 (MetaCons "Sum" PrefixI True) (S1 (MetaSel (Just "getSum") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
newtype Vector (Sum a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector (Sum a) = V_Sum (Vector a)
type Element (Sum a) 
Instance details

Defined in Universum.Container.Class

type Element (Sum a) = ElementDefault (Sum a)
type Rep1 Sum

Since: base-4.7.0.0

Instance details

Defined in Data.Semigroup.Internal

type Rep1 Sum = D1 (MetaData "Sum" "Data.Semigroup.Internal" "base" True) (C1 (MetaCons "Sum" PrefixI True) (S1 (MetaSel (Just "getSum") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype Product a #

Monoid under multiplication.

>>> getProduct (Product 3 <> Product 4 <> mempty)
12

Constructors

Product 

Fields

Instances
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 #

fail :: String -> Product 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 #

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 #

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 #

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 #

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) #

NFData1 Product

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> Product a -> () #

Unbox a => MVector MVector (Product a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s (Product a) -> Int

basicUnsafeSlice :: Int -> Int -> MVector s (Product a) -> MVector s (Product a)

basicOverlaps :: MVector s (Product a) -> MVector s (Product a) -> Bool

basicUnsafeNew :: PrimMonad m => Int -> m (MVector (PrimState m) (Product a))

basicInitialize :: PrimMonad m => MVector (PrimState m) (Product a) -> m ()

basicUnsafeReplicate :: PrimMonad m => Int -> Product a -> m (MVector (PrimState m) (Product a))

basicUnsafeRead :: PrimMonad m => MVector (PrimState m) (Product a) -> Int -> m (Product a)

basicUnsafeWrite :: PrimMonad m => MVector (PrimState m) (Product a) -> Int -> Product a -> m ()

basicClear :: PrimMonad m => MVector (PrimState m) (Product a) -> m ()

basicSet :: PrimMonad m => MVector (PrimState m) (Product a) -> Product a -> m ()

basicUnsafeCopy :: PrimMonad m => MVector (PrimState m) (Product a) -> MVector (PrimState m) (Product a) -> m ()

basicUnsafeMove :: PrimMonad m => MVector (PrimState m) (Product a) -> MVector (PrimState m) (Product a) -> m ()

basicUnsafeGrow :: PrimMonad m => MVector (PrimState m) (Product a) -> Int -> m (MVector (PrimState m) (Product a))

Unbox a => Vector Vector (Product a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: PrimMonad m => Mutable Vector (PrimState m) (Product a) -> m (Vector (Product a))

basicUnsafeThaw :: PrimMonad m => Vector (Product a) -> m (Mutable Vector (PrimState m) (Product a))

basicLength :: Vector (Product a) -> Int

basicUnsafeSlice :: Int -> Int -> Vector (Product a) -> Vector (Product a)

basicUnsafeIndexM :: Monad m => Vector (Product a) -> Int -> m (Product a)

basicUnsafeCopy :: PrimMonad m => Mutable Vector (PrimState m) (Product a) -> Vector (Product a) -> m ()

elemseq :: Vector (Product a) -> Product a -> b -> b

Bounded a => Bounded (Product a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

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 #

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 #

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 #

Read a => Read (Product a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

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 #

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 #

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 => 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 #

NFData a => NFData (Product a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Product a -> () #

Unbox a => Unbox (Product a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Container (Product a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Product a) :: Type #

Methods

toList :: Product a -> [Element (Product a)] #

null :: Product a -> Bool #

foldr :: (Element (Product a) -> b -> b) -> b -> Product a -> b #

foldl :: (b -> Element (Product a) -> b) -> b -> Product a -> b #

foldl' :: (b -> Element (Product a) -> b) -> b -> Product a -> b #

length :: Product a -> Int #

elem :: Element (Product a) -> Product a -> Bool #

maximum :: Product a -> Element (Product a) #

minimum :: Product a -> Element (Product a) #

foldMap :: Monoid m => (Element (Product a) -> m) -> Product a -> m #

fold :: Product a -> Element (Product a) #

foldr' :: (Element (Product a) -> b -> b) -> b -> Product a -> b #

foldr1 :: (Element (Product a) -> Element (Product a) -> Element (Product a)) -> Product a -> Element (Product a) #

foldl1 :: (Element (Product a) -> Element (Product a) -> Element (Product a)) -> Product a -> Element (Product a) #

notElem :: Element (Product a) -> Product a -> Bool #

all :: (Element (Product a) -> Bool) -> Product a -> Bool #

any :: (Element (Product a) -> Bool) -> Product a -> Bool #

and :: Product a -> Bool #

or :: Product a -> Bool #

find :: (Element (Product a) -> Bool) -> Product a -> Maybe (Element (Product a)) #

safeHead :: Product a -> Maybe (Element (Product a)) #

Generic1 Product 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep1 Product :: k -> Type #

Methods

from1 :: Product a -> Rep1 Product a #

to1 :: Rep1 Product a -> Product a #

newtype MVector s (Product a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s (Product a) = MV_Product (MVector s a)
type Rep (Product a)

Since: base-4.7.0.0

Instance details

Defined in Data.Semigroup.Internal

type Rep (Product a) = D1 (MetaData "Product" "Data.Semigroup.Internal" "base" True) (C1 (MetaCons "Product" PrefixI True) (S1 (MetaSel (Just "getProduct") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
newtype Vector (Product a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector (Product a) = V_Product (Vector a)
type Element (Product a) 
Instance details

Defined in Universum.Container.Class

type Element (Product a) = ElementDefault (Product a)
type Rep1 Product

Since: base-4.7.0.0

Instance details

Defined in Data.Semigroup.Internal

type Rep1 Product = D1 (MetaData "Product" "Data.Semigroup.Internal" "base" True) (C1 (MetaCons "Product" PrefixI True) (S1 (MetaSel (Just "getProduct") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype Alt (f :: k -> Type) (a :: k) :: forall k. (k -> Type) -> k -> Type #

Monoid under <|>.

Since: base-4.8.0.0

Constructors

Alt 

Fields

Instances
Generic1 (Alt f :: k -> Type) 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep1 (Alt f) :: k -> Type #

Methods

from1 :: Alt f a -> Rep1 (Alt f) a #

to1 :: Rep1 (Alt f) a -> Alt f a #

Unbox (f a) => MVector MVector (Alt f a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s (Alt f a) -> Int

basicUnsafeSlice :: Int -> Int -> MVector s (Alt f a) -> MVector s (Alt f a)

basicOverlaps :: MVector s (Alt f a) -> MVector s (Alt f a) -> Bool

basicUnsafeNew :: PrimMonad m => Int -> m (MVector (PrimState m) (Alt f a))

basicInitialize :: PrimMonad m => MVector (PrimState m) (Alt f a) -> m ()

basicUnsafeReplicate :: PrimMonad m => Int -> Alt f a -> m (MVector (PrimState m) (Alt f a))

basicUnsafeRead :: PrimMonad m => MVector (PrimState m) (Alt f a) -> Int -> m (Alt f a)

basicUnsafeWrite :: PrimMonad m => MVector (PrimState m) (Alt f a) -> Int -> Alt f a -> m ()

basicClear :: PrimMonad m => MVector (PrimState m) (Alt f a) -> m ()

basicSet :: PrimMonad m => MVector (PrimState m) (Alt f a) -> Alt f a -> m ()

basicUnsafeCopy :: PrimMonad m => MVector (PrimState m) (Alt f a) -> MVector (PrimState m) (Alt f a) -> m ()

basicUnsafeMove :: PrimMonad m => MVector (PrimState m) (Alt f a) -> MVector (PrimState m) (Alt f a) -> m ()

basicUnsafeGrow :: PrimMonad m => MVector (PrimState m) (Alt f a) -> Int -> m (MVector (PrimState m) (Alt f a))

Unbox (f a) => Vector Vector (Alt f a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: PrimMonad m => Mutable Vector (PrimState m) (Alt f a) -> m (Vector (Alt f a))

basicUnsafeThaw :: PrimMonad m => Vector (Alt f a) -> m (Mutable Vector (PrimState m) (Alt f a))

basicLength :: Vector (Alt f a) -> Int

basicUnsafeSlice :: Int -> Int -> Vector (Alt f a) -> Vector (Alt f a)

basicUnsafeIndexM :: Monad m => Vector (Alt f a) -> Int -> m (Alt f a)

basicUnsafeCopy :: PrimMonad m => Mutable Vector (PrimState m) (Alt f a) -> Vector (Alt f a) -> m ()

elemseq :: Vector (Alt f a) -> Alt f a -> b -> b

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 #

fail :: String -> Alt 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 #

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 #

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 #

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 #

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) #

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] #

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 #

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] #

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 #

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 #

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 #

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] #

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 #

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 #

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 #

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 #

Unbox (f a) => Unbox (Alt f a) 
Instance details

Defined in Data.Vector.Unboxed.Base

type Rep1 (Alt f :: k -> Type)

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

type Rep1 (Alt f :: k -> Type) = D1 (MetaData "Alt" "Data.Semigroup.Internal" "base" True) (C1 (MetaCons "Alt" PrefixI True) (S1 (MetaSel (Just "getAlt") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 f)))
newtype MVector s (Alt f a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s (Alt f a) = MV_Alt (MVector s (f a))
type Rep (Alt f a)

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

type Rep (Alt f a) = D1 (MetaData "Alt" "Data.Semigroup.Internal" "base" True) (C1 (MetaCons "Alt" PrefixI True) (S1 (MetaSel (Just "getAlt") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (f a))))
newtype Vector (Alt f a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector (Alt f a) = V_Alt (Vector (f a))

someNatVal :: Natural -> SomeNat #

Convert an integer into an unknown type-level natural.

Since: base-4.10.0.0

natVal :: KnownNat n => proxy n -> Natural #

Since: base-4.10.0.0

data SomeNat where #

This type represents unknown type-level natural numbers.

Since: base-4.10.0.0

Constructors

SomeNat :: forall (n :: Nat). KnownNat n => Proxy n -> SomeNat 
Instances
Eq SomeNat

Since: base-4.7.0.0

Instance details

Defined in GHC.TypeNats

Methods

(==) :: SomeNat -> SomeNat -> Bool #

(/=) :: SomeNat -> SomeNat -> Bool #

Ord SomeNat

Since: base-4.7.0.0

Instance details

Defined in GHC.TypeNats

Read SomeNat

Since: base-4.7.0.0

Instance details

Defined in GHC.TypeNats

Show SomeNat

Since: base-4.7.0.0

Instance details

Defined in GHC.TypeNats

unfoldr :: (b -> Maybe (a, b)) -> b -> [a] #

The unfoldr function is a `dual' to foldr: while foldr reduces a list to a summary value, unfoldr builds a list from a seed value. The function takes the element and returns Nothing if it is done producing the list or returns Just (a,b), in which case, a is a prepended to the list and b is used as the next element in a recursive call. For example,

iterate f == unfoldr (\x -> Just (x, f x))

In some cases, unfoldr can undo a foldr operation:

unfoldr f' (foldr f z xs) == xs

if the following holds:

f' (f x y) = Just (x,y)
f' z       = Nothing

A simple use of unfoldr:

>>> unfoldr (\b -> if b == 0 then Nothing else Just (b, b-1)) 10
[10,9,8,7,6,5,4,3,2,1]

sortOn :: Ord b => (a -> b) -> [a] -> [a] #

Sort a list by comparing the results of a key function applied to each element. sortOn f is equivalent to sortBy (comparing f), but has the performance advantage of only evaluating f once for each element in the input list. This is called the decorate-sort-undecorate paradigm, or Schwartzian transform.

Elements are arranged from from lowest to highest, keeping duplicates in the order they appeared in the input.

>>> sortOn fst [(2, "world"), (4, "!"), (1, "Hello")]
[(1,"Hello"),(2,"world"),(4,"!")]

Since: base-4.8.0.0

sortBy :: (a -> a -> Ordering) -> [a] -> [a] #

The sortBy function is the non-overloaded version of sort.

>>> sortBy (\(a,_) (b,_) -> compare a b) [(2, "world"), (4, "!"), (1, "Hello")]
[(1,"Hello"),(2,"world"),(4,"!")]

sort :: Ord a => [a] -> [a] #

The sort function implements a stable sorting algorithm. It is a special case of sortBy, which allows the programmer to supply their own comparison function.

Elements are arranged from from lowest to highest, keeping duplicates in the order they appeared in the input.

>>> sort [1,6,4,3,2,5]
[1,2,3,4,5,6]

permutations :: [a] -> [[a]] #

The permutations function returns the list of all permutations of the argument.

>>> permutations "abc"
["abc","bac","cba","bca","cab","acb"]

subsequences :: [a] -> [[a]] #

The subsequences function returns the list of all subsequences of the argument.

>>> subsequences "abc"
["","a","b","ab","c","ac","bc","abc"]

tails :: [a] -> [[a]] #

The tails function returns all final segments of the argument, longest first. For example,

>>> tails "abc"
["abc","bc","c",""]

Note that tails has the following strictness property: tails _|_ = _|_ : _|_

inits :: [a] -> [[a]] #

The inits function returns all initial segments of the argument, shortest first. For example,

>>> inits "abc"
["","a","ab","abc"]

Note that inits has the following strictness property: inits (xs ++ _|_) = inits xs ++ _|_

In particular, inits _|_ = [] : _|_

group :: Eq a => [a] -> [[a]] #

The group function takes a list and returns a list of lists such that the concatenation of the result is equal to the argument. Moreover, each sublist in the result contains only equal elements. For example,

>>> group "Mississippi"
["M","i","ss","i","ss","i","pp","i"]

It is a special case of groupBy, which allows the programmer to supply their own equality test.

genericReplicate :: Integral i => i -> a -> [a] #

The genericReplicate function is an overloaded version of replicate, which accepts any Integral value as the number of repetitions to make.

genericSplitAt :: Integral i => i -> [a] -> ([a], [a]) #

The genericSplitAt function is an overloaded version of splitAt, which accepts any Integral value as the position at which to split.

genericDrop :: Integral i => i -> [a] -> [a] #

The genericDrop function is an overloaded version of drop, which accepts any Integral value as the number of elements to drop.

genericTake :: Integral i => i -> [a] -> [a] #

The genericTake function is an overloaded version of take, which accepts any Integral value as the number of elements to take.

genericLength :: Num i => [a] -> i #

The genericLength function is an overloaded version of length. In particular, instead of returning an Int, it returns any type which is an instance of Num. It is, however, less efficient than length.

transpose :: [[a]] -> [[a]] #

The transpose function transposes the rows and columns of its argument. For example,

>>> transpose [[1,2,3],[4,5,6]]
[[1,4],[2,5],[3,6]]

If some of the rows are shorter than the following rows, their elements are skipped:

>>> transpose [[10,11],[20],[],[30,31,32]]
[[10,20,30],[11,31],[32]]

intercalate :: [a] -> [[a]] -> [a] #

intercalate xs xss is equivalent to (concat (intersperse xs xss)). It inserts the list xs in between the lists in xss and concatenates the result.

>>> intercalate ", " ["Lorem", "ipsum", "dolor"]
"Lorem, ipsum, dolor"

intersperse :: a -> [a] -> [a] #

The intersperse function takes an element and a list and `intersperses' that element between the elements of the list. For example,

>>> intersperse ',' "abcde"
"a,b,c,d,e"

isPrefixOf :: Eq a => [a] -> [a] -> Bool #

The isPrefixOf function takes two lists and returns True iff the first list is a prefix of the second.

>>> "Hello" `isPrefixOf` "Hello World!"
True
>>> "Hello" `isPrefixOf` "Wello Horld!"
False

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

reads :: Read a => ReadS a #

equivalent to readsPrec with a precedence of 0.

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

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

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]

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"]

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

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) ...

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

Since: base-4.6.0.0

Constructors

Down a 
Instances
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 #

fail :: String -> 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 #

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 #

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 #

foldr :: (a -> b -> b) -> b -> Down a -> b #

foldr' :: (a -> b -> b) -> b -> Down a -> b #

foldl :: (b -> a -> b) -> b -> Down a -> b #

foldl' :: (b -> a -> b) -> b -> Down a -> b #

foldr1 :: (a -> a -> a) -> Down a -> a #

foldl1 :: (a -> a -> a) -> Down a -> a #

toList :: Down a -> [a] #

null :: Down a -> Bool #

length :: Down a -> Int #

elem :: Eq a => a -> Down a -> Bool #

maximum :: Ord a => Down a -> a #

minimum :: Ord a => Down a -> a #

sum :: Num a => Down a -> a #

product :: Num a => Down a -> a #

Traversable Down

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) #

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 #

NFData1 Down

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> Down a -> () #

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 :: PrimMonad m => Int -> m (MVector (PrimState m) (Down a))

basicInitialize :: PrimMonad m => MVector (PrimState m) (Down a) -> m ()

basicUnsafeReplicate :: PrimMonad m => Int -> Down a -> m (MVector (PrimState m) (Down a))

basicUnsafeRead :: PrimMonad m => MVector (PrimState m) (Down a) -> Int -> m (Down a)

basicUnsafeWrite :: PrimMonad m => MVector (PrimState m) (Down a) -> Int -> Down a -> m ()

basicClear :: PrimMonad m => MVector (PrimState m) (Down a) -> m ()

basicSet :: PrimMonad m => MVector (PrimState m) (Down a) -> Down a -> m ()

basicUnsafeCopy :: PrimMonad m => MVector (PrimState m) (Down a) -> MVector (PrimState m) (Down a) -> m ()

basicUnsafeMove :: PrimMonad m => MVector (PrimState m) (Down a) -> MVector (PrimState m) (Down a) -> m ()

basicUnsafeGrow :: PrimMonad m => MVector (PrimState m) (Down a) -> Int -> m (MVector (PrimState m) (Down a))

Unbox a => Vector Vector (Down a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: PrimMonad m => Mutable Vector (PrimState m) (Down a) -> m (Vector (Down a))

basicUnsafeThaw :: PrimMonad m => Vector (Down a) -> m (Mutable Vector (PrimState m) (Down a))

basicLength :: Vector (Down a) -> Int

basicUnsafeSlice :: Int -> Int -> Vector (Down a) -> Vector (Down a)

basicUnsafeIndexM :: Monad m => Vector (Down a) -> Int -> m (Down a)

basicUnsafeCopy :: PrimMonad m => Mutable Vector (PrimState m) (Down a) -> Vector (Down a) -> m ()

elemseq :: Vector (Down a) -> Down a -> b -> b

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 #

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 #

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 #

Read a => Read (Down a)

Since: base-4.7.0.0

Instance details

Defined in Data.Ord

Show a => Show (Down a)

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 #

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 #

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 #

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 #

NFData a => NFData (Down a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Down a -> () #

Unbox a => Unbox (Down a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Generic1 Down 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 Down :: k -> Type #

Methods

from1 :: Down a -> Rep1 Down a #

to1 :: Rep1 Down a -> Down a #

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

newtype Vector (Down a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector (Down a) = V_Down (Vector a)
type Rep1 Down

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

data Proxy (t :: k) :: forall k. k -> Type #

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
Generic1 (Proxy :: k -> Type) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 Proxy :: k -> Type #

Methods

from1 :: Proxy a -> Rep1 Proxy a #

to1 :: Rep1 Proxy a -> 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 #

fail :: String -> 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 #

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 #

Foldable (Proxy :: Type -> 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 #

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 #

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) #

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 -> 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 #

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] #

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 -> Type)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> 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 -> 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

Hashable1 (Proxy :: Type -> Type) 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> Proxy a -> Int

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] #

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 #

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 #

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

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 #

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 #

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 #

NFData (Proxy a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Proxy a -> () #

FromJSON (Proxy a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Proxy a) #

parseJSONList :: Value -> Parser [Proxy a] #

Hashable (Proxy a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Proxy a -> Int #

hash :: Proxy a -> Int

ToJSON (Proxy a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Proxy a -> Value

toEncoding :: Proxy a -> Encoding

toJSONList :: [Proxy a] -> Value

toEncodingList :: [Proxy a] -> Encoding

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 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))

data IOMode #

Instances
Enum 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

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

Ix 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 #

Swap bytes in Word16.

Since: base-4.7.0.0

xor :: Bits a => a -> a -> a infixl 6 #

Bitwise "xor"

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

(&) :: 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

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' argument, hence the recursion is reintroduced.

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

($>) :: 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

(<&>) :: 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

(<$>) :: 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)

lcm :: Integral a => a -> a -> a #

lcm x y is the smallest positive integer that both x and y divide.

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.

(^^) :: (Fractional a, Integral b) => a -> b -> a infixr 8 #

raise a number to an integral power

(^) :: (Num a, Integral b) => a -> b -> a infixr 8 #

raise a number to a non-negative integral power

odd :: Integral a => a -> Bool #

even :: Integral a => a -> Bool #

denominator :: Ratio a -> a #

Extract the denominator of the ratio in reduced form: the numerator and denominator have no common factor and the denominator is positive.

numerator :: Ratio a -> a #

Extract the numerator of the ratio in reduced form: the numerator and denominator have no common factor and the denominator is positive.

chr :: Int -> Char #

The toEnum method restricted to the type Char.

unzip3 :: [(a, b, c)] -> ([a], [b], [c]) #

The unzip3 function takes a list of triples and returns three lists, analogous to unzip.

unzip :: [(a, b)] -> ([a], [b]) #

unzip transforms a list of pairs into a list of first components and a list of second components.

zipWith :: (a -> b -> c) -> [a] -> [b] -> [c] #

zipWith generalises zip by zipping with the function given as the first argument, instead of a tupling function. For example, zipWith (+) is applied to two lists to produce the list of corresponding sums.

zipWith is right-lazy:

zipWith f [] _|_ = []

zip3 :: [a] -> [b] -> [c] -> [(a, b, c)] #

zip3 takes three lists and returns a list of triples, analogous to zip.

reverse :: [a] -> [a] #

reverse xs returns the elements of xs in reverse order. xs must be finite.

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).

splitAt :: Int -> [a] -> ([a], [a]) #

splitAt n xs returns a tuple where first element is xs prefix of length n and second element is the remainder of the list:

splitAt 6 "Hello World!" == ("Hello ","World!")
splitAt 3 [1,2,3,4,5] == ([1,2,3],[4,5])
splitAt 1 [1,2,3] == ([1],[2,3])
splitAt 3 [1,2,3] == ([1,2,3],[])
splitAt 4 [1,2,3] == ([1,2,3],[])
splitAt 0 [1,2,3] == ([],[1,2,3])
splitAt (-1) [1,2,3] == ([],[1,2,3])

It is equivalent to (take n xs, drop n xs) when n is not _|_ (splitAt _|_ xs = _|_). splitAt is an instance of the more general genericSplitAt, in which n may be of any integral type.

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.

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.

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]

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] == []

cycle :: [a] -> [a] #

cycle ties a finite list into a circular one, or equivalently, the infinite repetition of the original list. It is the identity on infinite lists.

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.

repeat :: a -> [a] #

repeat x is an infinite list, with x the value of every element.

iterate :: (a -> a) -> a -> [a] #

iterate f x returns an infinite list of repeated applications of f to x:

iterate f x == [x, f x, f (f x), ...]

Note that iterate is lazy, potentially leading to thunk build-up if the consumer doesn't force each iterate. See 'iterate\'' for a strict variant of this function.

scanr :: (a -> b -> b) -> b -> [a] -> [b] #

scanr is the right-to-left dual of scanl. Note that

head (scanr f z xs) == foldr f z xs.

scanl :: (b -> a -> b) -> b -> [a] -> [b] #

scanl is similar to foldl, but returns a list of successive reduced values from the left:

scanl f z [x1, x2, ...] == [z, z `f` x1, (z `f` x1) `f` x2, ...]

Note that

last (scanl f z xs) == foldl f z xs.

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]

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]

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]

maybeToList :: Maybe a -> [a] #

The maybeToList function returns an empty list when given Nothing or a singleton list when not given Nothing.

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

fromMaybe :: a -> Maybe a -> a #

The fromMaybe function takes a default value and and Maybe value. If the Maybe is Nothing, it returns the default values; 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

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

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

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
""

swap :: (a, b) -> (b, a) #

Swap the components of a pair.

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]

curry :: ((a, b) -> c) -> a -> b -> c #

curry converts an uncurried function to a curried function.

Examples

Expand
>>> curry fst 1 2
1

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
NFData1 MVar

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> 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 #

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 -> () #

PrimUnlifted (MVar a) 
Instance details

Defined in Data.Primitive.UnliftedArray

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.

currentCallStack :: IO [String] #

Returns a [String] representing the current call stack. This can be useful for debugging.

The implementation uses the call-stack simulation maintained by the profiler, so it only works if the program was compiled with -prof and contains suitable SCC annotations (e.g. by using -fprof-auto). Otherwise, the list returned is likely to be empty or uninformative.

Since: base-4.5.0.0

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"

(.) :: (b -> c) -> (a -> b) -> a -> c infixr 9 #

Function composition.

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]

id :: a -> a #

Identity function.

id x = x

ord :: Char -> Int #

The fromEnum method restricted to the type Char.

ap :: Monad m => m (a -> b) -> m a -> m b #

In many situations, the liftM operations can be replaced by uses of ap, which promotes function application.

return f `ap` x1 `ap` ... `ap` xn

is equivalent to

liftMn f x1 x2 ... xn

liftM5 :: Monad m => (a1 -> a2 -> a3 -> a4 -> a5 -> r) -> m a1 -> m a2 -> m a3 -> m a4 -> m a5 -> m r #

Promote a function to a monad, scanning the monadic arguments from left to right (cf. liftM2).

liftM4 :: Monad m => (a1 -> a2 -> a3 -> a4 -> r) -> m a1 -> m a2 -> m a3 -> m a4 -> m r #

Promote a function to a monad, scanning the monadic arguments from left to right (cf. liftM2).

liftM3 :: Monad m => (a1 -> a2 -> a3 -> r) -> m a1 -> m a2 -> m a3 -> m r #

Promote a function to a monad, scanning the monadic arguments from left to right (cf. liftM2).

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.

(=<<) :: Monad m => (a -> m b) -> m a -> m b infixr 1 #

Same as >>=, but with the arguments interchanged.

liftA3 :: Applicative f => (a -> b -> c -> d) -> f a -> f b -> f c -> f d #

Lift a ternary function to actions.

(<**>) :: Applicative f => f a -> f (a -> b) -> f b infixl 4 #

A variant of <*> with the arguments reversed.

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

empty :: f a #

The identity of <|>

(<|>) :: 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
Alternative []

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

empty :: [a] #

(<|>) :: [a] -> [a] -> [a] #

some :: [a] -> [[a]] #

many :: [a] -> [[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 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 Option

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

empty :: Option a #

(<|>) :: Option a -> Option a -> Option a #

some :: Option a -> Option [a] #

many :: Option a -> Option [a] #

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 ReadPrec

Since: base-4.6.0.0

Instance details

Defined in Text.ParserCombinators.ReadPrec

Methods

empty :: ReadPrec a #

(<|>) :: ReadPrec a -> ReadPrec a -> ReadPrec a #

some :: ReadPrec a -> ReadPrec [a] #

many :: ReadPrec a -> ReadPrec [a] #

Alternative 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 Get

Since: 0.7.0.0

Instance details

Defined in Data.Binary.Get.Internal

Methods

empty :: Get a #

(<|>) :: Get a -> Get a -> Get a #

some :: Get a -> Get [a] #

many :: Get a -> Get [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 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 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 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 Concurrently 
Instance details

Defined in Control.Concurrent.Async

Methods

empty :: Concurrently a #

(<|>) :: Concurrently a -> Concurrently a -> Concurrently a #

some :: Concurrently a -> Concurrently [a] #

many :: Concurrently a -> Concurrently [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 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 DList 
Instance details

Defined in Data.DList

Methods

empty :: DList a #

(<|>) :: DList a -> DList a -> DList a #

some :: DList a -> DList [a] #

many :: DList a -> DList [a] #

Alternative Array 
Instance details

Defined in Data.Primitive.Array

Methods

empty :: Array a #

(<|>) :: Array a -> Array a -> Array a #

some :: Array a -> Array [a] #

many :: Array a -> Array [a] #

Alternative SmallArray 
Instance details

Defined in Data.Primitive.SmallArray

Methods

empty :: SmallArray a #

(<|>) :: SmallArray a -> SmallArray a -> SmallArray a #

some :: SmallArray a -> SmallArray [a] #

many :: SmallArray a -> SmallArray [a] #

Alternative Result 
Instance details

Defined in Codec.QRCode.Data.Result

Methods

empty :: Result a #

(<|>) :: Result a -> Result a -> Result a #

some :: Result a -> Result [a] #

many :: Result a -> Result [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] #

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] #

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] #

Alternative m => Alternative (KatipContextT m) 
Instance details

Defined in Katip.Monadic

MonadUnliftIO m => Alternative (Conc m) 
Instance details

Defined in UnliftIO.Internals.Async

Methods

empty :: Conc m a #

(<|>) :: Conc m a -> Conc m a -> Conc m a #

some :: Conc m a -> Conc m [a] #

many :: Conc m a -> Conc m [a] #

MonadUnliftIO m => Alternative (Concurrently m) 
Instance details

Defined in UnliftIO.Internals.Async

Methods

empty :: Concurrently m a #

(<|>) :: Concurrently m a -> Concurrently m a -> Concurrently m a #

some :: Concurrently m a -> Concurrently m [a] #

many :: Concurrently m a -> Concurrently m [a] #

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] #

Alternative m => Alternative (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

empty :: ResourceT m a #

(<|>) :: ResourceT m a -> ResourceT m a -> ResourceT m a #

some :: ResourceT m a -> ResourceT m [a] #

many :: ResourceT m a -> ResourceT m [a] #

Alternative m => Alternative (NoLoggingT m) 
Instance details

Defined in Katip.Monadic

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 (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] #

Monoid m => Alternative (Mon m) 
Instance details

Defined in Env.Internal.Free

Methods

empty :: Mon m a #

(<|>) :: Mon m a -> Mon m a -> Mon m a #

some :: Mon m a -> Mon m [a] #

many :: Mon m a -> Mon m [a] #

Functor f => Alternative (Alt f) 
Instance details

Defined in Env.Internal.Free

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] #

(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 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 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] #

(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 (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 (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] #

(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, 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] #

(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, 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 (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] #

(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, 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] #

(Monoid w, Functor m, MonadPlus m) => Alternative (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.Lazy

Methods

empty :: RWST r w s m a #

(<|>) :: RWST r w s m a -> RWST r w s m a -> RWST r w s m a #

some :: RWST r w s m a -> RWST r w s m [a] #

many :: RWST r w s m a -> RWST r w s m [a] #

(Monoid w, Functor m, MonadPlus m) => Alternative (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.Strict

Methods

empty :: RWST r w s m a #

(<|>) :: RWST r w s m a -> RWST r w s m a -> RWST r w s m a #

some :: RWST r w s m a -> RWST r w s m [a] #

many :: RWST r w s m a -> RWST r w s m [a] #

class (Alternative m, Monad m) => MonadPlus (m :: Type -> Type) where #

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
MonadPlus []

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

mzero :: [a] #

mplus :: [a] -> [a] -> [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 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 Option

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

mzero :: Option a #

mplus :: Option a -> Option a -> Option 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 ReadPrec

Since: base-2.1

Instance details

Defined in Text.ParserCombinators.ReadPrec

Methods

mzero :: ReadPrec a #

mplus :: ReadPrec a -> ReadPrec a -> ReadPrec 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 Get

Since: 0.7.1.0

Instance details

Defined in Data.Binary.Get.Internal

Methods

mzero :: Get a #

mplus :: Get a -> Get a -> Get a #

MonadPlus Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

mzero :: Seq a #

mplus :: Seq a -> Seq a -> Seq a #

MonadPlus Vector 
Instance details

Defined in Data.Vector

Methods

mzero :: Vector a #

mplus :: Vector a -> Vector a -> Vector a #

MonadPlus Parser 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

mzero :: Parser a #

mplus :: Parser a -> Parser a -> Parser 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 Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

mzero :: Result a #

mplus :: Result a -> Result a -> Result a #

MonadPlus IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

mzero :: IResult a #

mplus :: IResult a -> IResult a -> IResult a #

MonadPlus DList 
Instance details

Defined in Data.DList

Methods

mzero :: DList a #

mplus :: DList a -> DList a -> DList a #

MonadPlus Array 
Instance details

Defined in Data.Primitive.Array

Methods

mzero :: Array a #

mplus :: Array a -> Array a -> Array a #

MonadPlus SmallArray 
Instance details

Defined in Data.Primitive.SmallArray

Methods

mzero :: SmallArray a #

mplus :: SmallArray a -> SmallArray a -> SmallArray a #

MonadPlus Result 
Instance details

Defined in Codec.QRCode.Data.Result

Methods

mzero :: Result a #

mplus :: Result a -> Result a -> Result 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 #

(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 #

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 (KatipContextT m) 
Instance details

Defined in Katip.Monadic

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 #

MonadPlus m => MonadPlus (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

mzero :: ResourceT m a #

mplus :: ResourceT m a -> ResourceT m a -> ResourceT m a #

MonadPlus m => MonadPlus (NoLoggingT m) 
Instance details

Defined in Katip.Monadic

Methods

mzero :: NoLoggingT m a #

mplus :: NoLoggingT m a -> NoLoggingT m a -> NoLoggingT m 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 #

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 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 #

(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 (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 (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 #

(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 #

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 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 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 (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 #

data NonEmpty a #

Non-empty (and non-strict) list type.

Since: base-4.9.0.0

Constructors

a :| [a] infixr 5 
Instances
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 #

fail :: String -> 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 #

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 #

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 #

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 #

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) #

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 #

NFData1 NonEmpty

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> NonEmpty a -> () #

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

IsList (NonEmpty a)

Since: base-4.9.0.0

Instance details

Defined in GHC.Exts

Associated Types

type Item (NonEmpty a) :: Type #

Methods

fromList :: [Item (NonEmpty a)] -> NonEmpty a #

fromListN :: Int -> [Item (NonEmpty a)] -> NonEmpty a #

toList :: NonEmpty a -> [Item (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 #

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 #

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 #

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 #

NFData a => NFData (NonEmpty a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: NonEmpty a -> () #

FromJSON a => FromJSON (NonEmpty a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (NonEmpty a) #

parseJSONList :: Value -> Parser [NonEmpty a] #

Hashable a => Hashable (NonEmpty a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> NonEmpty a -> Int #

hash :: NonEmpty a -> Int

ToJSON a => ToJSON (NonEmpty a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: NonEmpty a -> Value

toEncoding :: NonEmpty a -> Encoding

toJSONList :: [NonEmpty a] -> Value

toEncodingList :: [NonEmpty a] -> Encoding

Container (NonEmpty a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (NonEmpty a) :: Type #

Methods

toList :: NonEmpty a -> [Element (NonEmpty a)] #

null :: NonEmpty a -> Bool #

foldr :: (Element (NonEmpty a) -> b -> b) -> b -> NonEmpty a -> b #

foldl :: (b -> Element (NonEmpty a) -> b) -> b -> NonEmpty a -> b #

foldl' :: (b -> Element (NonEmpty a) -> b) -> b -> NonEmpty a -> b #

length :: NonEmpty a -> Int #

elem :: Element (NonEmpty a) -> NonEmpty a -> Bool #

maximum :: NonEmpty a -> Element (NonEmpty a) #

minimum :: NonEmpty a -> Element (NonEmpty a) #

foldMap :: Monoid m => (Element (NonEmpty a) -> m) -> NonEmpty a -> m #

fold :: NonEmpty a -> Element (NonEmpty a) #

foldr' :: (Element (NonEmpty a) -> b -> b) -> b -> NonEmpty a -> b #

foldr1 :: (Element (NonEmpty a) -> Element (NonEmpty a) -> Element (NonEmpty a)) -> NonEmpty a -> Element (NonEmpty a) #

foldl1 :: (Element (NonEmpty a) -> Element (NonEmpty a) -> Element (NonEmpty a)) -> NonEmpty a -> Element (NonEmpty a) #

notElem :: Element (NonEmpty a) -> NonEmpty a -> Bool #

all :: (Element (NonEmpty a) -> Bool) -> NonEmpty a -> Bool #

any :: (Element (NonEmpty a) -> Bool) -> NonEmpty a -> Bool #

and :: NonEmpty a -> Bool #

or :: NonEmpty a -> Bool #

find :: (Element (NonEmpty a) -> Bool) -> NonEmpty a -> Maybe (Element (NonEmpty a)) #

safeHead :: NonEmpty a -> Maybe (Element (NonEmpty a)) #

One (NonEmpty a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (NonEmpty a) :: Type #

Methods

one :: OneItem (NonEmpty a) -> NonEmpty a #

Generic1 NonEmpty 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 NonEmpty :: k -> Type #

Methods

from1 :: NonEmpty a -> Rep1 NonEmpty a #

to1 :: Rep1 NonEmpty a -> NonEmpty a #

Each (NonEmpty a) (NonEmpty b) a b 
Instance details

Defined in Lens.Micro.Internal

Methods

each :: Traversal (NonEmpty a) (NonEmpty b) a b

type Rep (NonEmpty a)

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 Element (NonEmpty a) 
Instance details

Defined in Universum.Container.Class

type Element (NonEmpty a) = ElementDefault (NonEmpty a)
type OneItem (NonEmpty a) 
Instance details

Defined in Universum.Container.Class

type OneItem (NonEmpty a) = a
type Rep1 NonEmpty

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

type String = [Char] #

A String is a list of characters. String constants in Haskell are values of type String.

getCallStack :: CallStack -> [([Char], SrcLoc)] #

Extract a list of call-sites from the CallStack.

The list is ordered by most recent call.

Since: base-4.8.1.0

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

stimesIdempotentMonoid :: (Integral b, Monoid a) => b -> a -> a #

This is a valid definition of stimes for an idempotent Monoid.

When mappend x x = x, this definition should be preferred, because it works in O(1) rather than O(log n)

data SomeException where #

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

SomeException :: forall e. Exception e => e -> SomeException 

(&&) :: Bool -> Bool -> Bool infixr 3 #

Boolean "and"

(||) :: Bool -> Bool -> Bool infixr 2 #

Boolean "or"

not :: Bool -> Bool #

Boolean "not"

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
Eq ByteString 
Instance details

Defined in Data.ByteString.Internal

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 :: (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 #

Ord ByteString 
Instance details

Defined in Data.ByteString.Internal

Read ByteString 
Instance details

Defined in Data.ByteString.Internal

Show ByteString 
Instance details

Defined in Data.ByteString.Internal

IsString ByteString 
Instance details

Defined in Data.ByteString.Internal

Semigroup ByteString 
Instance details

Defined in Data.ByteString.Internal

Monoid ByteString 
Instance details

Defined in Data.ByteString.Internal

NFData ByteString 
Instance details

Defined in Data.ByteString.Internal

Methods

rnf :: ByteString -> () #

Hashable ByteString 
Instance details

Defined in Data.Hashable.Class

PersistField ByteString 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: ByteString -> PersistValue

fromPersistValue :: PersistValue -> Either Text ByteString

PersistFieldSql ByteString 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy ByteString -> SqlType

Container ByteString 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element ByteString :: Type #

One ByteString 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem ByteString :: Type #

Print ByteString 
Instance details

Defined in Universum.Print.Internal

Methods

hPutStr :: Handle -> ByteString -> IO ()

hPutStrLn :: Handle -> ByteString -> IO ()

Chunk ByteString 
Instance details

Defined in Data.Attoparsec.Internal.Types

Associated Types

type ChunkElem ByteString :: Type

FieldDefault ByteString 
Instance details

Defined in Data.ProtoLens.Message

ToBinary ByteString 
Instance details

Defined in Codec.QRCode.Data.ToInput

Methods

toBinary :: ByteString -> [Word8]

FoldCase ByteString 
Instance details

Defined in Data.CaseInsensitive.Internal

ByteArrayAccess ByteString 
Instance details

Defined in Data.ByteArray.Types

Methods

length :: ByteString -> Int

withByteArray :: ByteString -> (Ptr p -> IO a) -> IO a

copyByteArrayToPtr :: ByteString -> Ptr p -> IO ()

ByteArray ByteString 
Instance details

Defined in Data.ByteArray.Types

Methods

allocRet :: Int -> (Ptr p -> IO a) -> IO (a, ByteString)

ConvertUtf8 String ByteString 
Instance details

Defined in Universum.String.Conversion

ConvertUtf8 Text ByteString 
Instance details

Defined in Universum.String.Conversion

ConvertUtf8 Text ByteString 
Instance details

Defined in Universum.String.Conversion

StringConv String ByteString 
Instance details

Defined in Data.String.Conv

Methods

strConv :: Leniency -> String -> ByteString

StringConv ByteString ByteString 
Instance details

Defined in Data.String.Conv

Methods

strConv :: Leniency -> ByteString0 -> ByteString

StringConv ByteString String 
Instance details

Defined in Data.String.Conv

Methods

strConv :: Leniency -> ByteString -> String

StringConv ByteString ByteString 
Instance details

Defined in Data.String.Conv

Methods

strConv :: Leniency -> ByteString -> ByteString0

StringConv ByteString ByteString 
Instance details

Defined in Data.String.Conv

Methods

strConv :: Leniency -> ByteString -> ByteString

StringConv ByteString Text 
Instance details

Defined in Data.String.Conv

Methods

strConv :: Leniency -> ByteString -> Text

StringConv ByteString Text 
Instance details

Defined in Data.String.Conv

Methods

strConv :: Leniency -> ByteString -> Text

StringConv Text ByteString 
Instance details

Defined in Data.String.Conv

Methods

strConv :: Leniency -> Text -> ByteString

StringConv Text ByteString 
Instance details

Defined in Data.String.Conv

Methods

strConv :: Leniency -> Text -> ByteString

FromGrpc RPreimage ByteString Source # 
Instance details

Defined in LndClient.Data.Newtype

FromGrpc RHash ByteString Source # 
Instance details

Defined in LndClient.Data.Newtype

FromGrpc NodePubKey ByteString Source # 
Instance details

Defined in LndClient.Data.Newtype

ToGrpc AezeedPassphrase ByteString Source # 
Instance details

Defined in LndClient.Data.Newtype

ToGrpc RPreimage ByteString Source # 
Instance details

Defined in LndClient.Data.Newtype

ToGrpc RHash ByteString Source # 
Instance details

Defined in LndClient.Data.Newtype

ToGrpc NodePubKey ByteString Source # 
Instance details

Defined in LndClient.Data.Newtype

ToGrpc LndWalletPassword ByteString Source # 
Instance details

Defined in LndClient.Data.LndEnv

BinaryParam ByteString TiffInfo 
Instance details

Defined in Codec.Picture.Tiff

Methods

getP :: ByteString -> Get TiffInfo

putP :: ByteString -> TiffInfo -> Put

HasField VerifyMessageRequest "msg" ByteString 
Instance details

Defined in Proto.LndGrpc

HasField SignMessageRequest "msg" ByteString 
Instance details

Defined in Proto.LndGrpc

HasField SendToRouteRequest "paymentHash" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "paymentHash" -> (ByteString -> f ByteString) -> SendToRouteRequest -> f SendToRouteRequest

HasField SendResponse "paymentHash" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "paymentHash" -> (ByteString -> f ByteString) -> SendResponse -> f SendResponse

HasField SendResponse "paymentPreimage" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "paymentPreimage" -> (ByteString -> f ByteString) -> SendResponse -> f SendResponse

HasField SendRequest'DestCustomRecordsEntry "value" ByteString 
Instance details

Defined in Proto.LndGrpc

HasField SendRequest "dest" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "dest" -> (ByteString -> f ByteString) -> SendRequest -> f SendRequest

HasField SendRequest "lastHopPubkey" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "lastHopPubkey" -> (ByteString -> f ByteString) -> SendRequest -> f SendRequest

HasField SendRequest "paymentAddr" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "paymentAddr" -> (ByteString -> f ByteString) -> SendRequest -> f SendRequest

HasField SendRequest "paymentHash" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "paymentHash" -> (ByteString -> f ByteString) -> SendRequest -> f SendRequest

HasField RestoreChanBackupRequest "multiChanBackup" ByteString 
Instance details

Defined in Proto.LndGrpc

HasField ReadyForPsbtFunding "psbt" ByteString 
Instance details

Defined in Proto.LndGrpc

HasField QueryRoutesRequest'DestCustomRecordsEntry "value" ByteString 
Instance details

Defined in Proto.LndGrpc

HasField QueryRoutesRequest "lastHopPubkey" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "lastHopPubkey" -> (ByteString -> f ByteString) -> QueryRoutesRequest -> f QueryRoutesRequest

HasField PsbtShim "basePsbt" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "basePsbt" -> (ByteString -> f ByteString) -> PsbtShim -> f PsbtShim

HasField PsbtShim "pendingChanId" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "pendingChanId" -> (ByteString -> f ByteString) -> PsbtShim -> f PsbtShim

HasField PendingUpdate "txid" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "txid" -> (ByteString -> f ByteString) -> PendingUpdate -> f PendingUpdate

HasField PaymentHash "rHash" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "rHash" -> (ByteString -> f ByteString) -> PaymentHash -> f PaymentHash

HasField PayReq "paymentAddr" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "paymentAddr" -> (ByteString -> f ByteString) -> PayReq -> f PayReq

HasField OutPoint "txidBytes" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "txidBytes" -> (ByteString -> f ByteString) -> OutPoint -> f OutPoint

HasField OpenStatusUpdate "pendingChanId" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "pendingChanId" -> (ByteString -> f ByteString) -> OpenStatusUpdate -> f OpenStatusUpdate

HasField OpenChannelRequest "nodePubkey" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "nodePubkey" -> (ByteString -> f ByteString) -> OpenChannelRequest -> f OpenChannelRequest

HasField NodeUpdate "globalFeatures" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "globalFeatures" -> (ByteString -> f ByteString) -> NodeUpdate -> f NodeUpdate

HasField NodePair "from" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "from" -> (ByteString -> f ByteString) -> NodePair -> f NodePair

HasField NodePair "to" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "to" -> (ByteString -> f ByteString) -> NodePair -> f NodePair

HasField MultiChanBackup "multiChanBackup" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "multiChanBackup" -> (ByteString -> f ByteString) -> MultiChanBackup -> f MultiChanBackup

HasField MacaroonId "nonce" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "nonce" -> (ByteString -> f ByteString) -> MacaroonId -> f MacaroonId

HasField MacaroonId "storageId" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "storageId" -> (ByteString -> f ByteString) -> MacaroonId -> f MacaroonId

HasField MPPRecord "paymentAddr" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "paymentAddr" -> (ByteString -> f ByteString) -> MPPRecord -> f MPPRecord

HasField ListChannelsRequest "peer" ByteString 
Instance details

Defined in Proto.LndGrpc

HasField KeyDescriptor "rawKeyBytes" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "rawKeyBytes" -> (ByteString -> f ByteString) -> KeyDescriptor -> f KeyDescriptor

HasField InvoiceHTLC'CustomRecordsEntry "value" ByteString 
Instance details

Defined in Proto.LndGrpc

HasField Invoice "descriptionHash" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "descriptionHash" -> (ByteString -> f ByteString) -> Invoice -> f Invoice

HasField Invoice "paymentAddr" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "paymentAddr" -> (ByteString -> f ByteString) -> Invoice -> f Invoice

HasField Invoice "rHash" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "rHash" -> (ByteString -> f ByteString) -> Invoice -> f Invoice

HasField Invoice "rPreimage" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "rPreimage" -> (ByteString -> f ByteString) -> Invoice -> f Invoice

HasField Hop'CustomRecordsEntry "value" ByteString 
Instance details

Defined in Proto.LndGrpc

HasField HTLCAttempt "preimage" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "preimage" -> (ByteString -> f ByteString) -> HTLCAttempt -> f HTLCAttempt

HasField HTLC "hashLock" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "hashLock" -> (ByteString -> f ByteString) -> HTLC -> f HTLC

HasField FundingShimCancel "pendingChanId" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "pendingChanId" -> (ByteString -> f ByteString) -> FundingShimCancel -> f FundingShimCancel

HasField FundingPsbtVerify "fundedPsbt" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "fundedPsbt" -> (ByteString -> f ByteString) -> FundingPsbtVerify -> f FundingPsbtVerify

HasField FundingPsbtVerify "pendingChanId" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "pendingChanId" -> (ByteString -> f ByteString) -> FundingPsbtVerify -> f FundingPsbtVerify

HasField FundingPsbtFinalize "finalRawTx" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "finalRawTx" -> (ByteString -> f ByteString) -> FundingPsbtFinalize -> f FundingPsbtFinalize

HasField FundingPsbtFinalize "pendingChanId" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "pendingChanId" -> (ByteString -> f ByteString) -> FundingPsbtFinalize -> f FundingPsbtFinalize

HasField FundingPsbtFinalize "signedPsbt" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "signedPsbt" -> (ByteString -> f ByteString) -> FundingPsbtFinalize -> f FundingPsbtFinalize

HasField Failure "onionSha256" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "onionSha256" -> (ByteString -> f ByteString) -> Failure -> f Failure

HasField ConfirmationUpdate "blockSha" ByteString 
Instance details

Defined in Proto.LndGrpc

HasField ChannelUpdate "chainHash" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "chainHash" -> (ByteString -> f ByteString) -> ChannelUpdate -> f ChannelUpdate

HasField ChannelUpdate "extraOpaqueData" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "extraOpaqueData" -> (ByteString -> f ByteString) -> ChannelUpdate -> f ChannelUpdate

HasField ChannelUpdate "signature" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "signature" -> (ByteString -> f ByteString) -> ChannelUpdate -> f ChannelUpdate

HasField ChannelPoint "fundingTxidBytes" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "fundingTxidBytes" -> (ByteString -> f ByteString) -> ChannelPoint -> f ChannelPoint

HasField ChannelCloseUpdate "closingTxid" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "closingTxid" -> (ByteString -> f ByteString) -> ChannelCloseUpdate -> f ChannelCloseUpdate

HasField ChannelBackup "chanBackup" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "chanBackup" -> (ByteString -> f ByteString) -> ChannelBackup -> f ChannelBackup

HasField ChannelAcceptResponse "pendingChanId" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "pendingChanId" -> (ByteString -> f ByteString) -> ChannelAcceptResponse -> f ChannelAcceptResponse

HasField ChannelAcceptRequest "chainHash" ByteString 
Instance details

Defined in Proto.LndGrpc

HasField ChannelAcceptRequest "nodePubkey" ByteString 
Instance details

Defined in Proto.LndGrpc

HasField ChannelAcceptRequest "pendingChanId" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "pendingChanId" -> (ByteString -> f ByteString) -> ChannelAcceptRequest -> f ChannelAcceptRequest

HasField ChanPointShim "pendingChanId" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "pendingChanId" -> (ByteString -> f ByteString) -> ChanPointShim -> f ChanPointShim

HasField ChanPointShim "remoteKey" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "remoteKey" -> (ByteString -> f ByteString) -> ChanPointShim -> f ChanPointShim

HasField AddInvoiceResponse "paymentAddr" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "paymentAddr" -> (ByteString -> f ByteString) -> AddInvoiceResponse -> f AddInvoiceResponse

HasField AddInvoiceResponse "rHash" ByteString 
Instance details

Defined in Proto.LndGrpc

HasField AMPRecord "rootShare" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "rootShare" -> (ByteString -> f ByteString) -> AMPRecord -> f AMPRecord

HasField AMPRecord "setId" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "setId" -> (ByteString -> f ByteString) -> AMPRecord -> f AMPRecord

HasField AMP "hash" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "hash" -> (ByteString -> f ByteString) -> AMP -> f AMP

HasField AMP "preimage" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "preimage" -> (ByteString -> f ByteString) -> AMP -> f AMP

HasField AMP "rootShare" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "rootShare" -> (ByteString -> f ByteString) -> AMP -> f AMP

HasField AMP "setId" ByteString 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "setId" -> (ByteString -> f ByteString) -> AMP -> f AMP

HasField SubscribeSingleInvoiceRequest "rHash" ByteString 
Instance details

Defined in Proto.InvoiceGrpc

HasField SettleInvoiceMsg "preimage" ByteString 
Instance details

Defined in Proto.InvoiceGrpc

Methods

fieldOf :: Functor f => Proxy# "preimage" -> (ByteString -> f ByteString) -> SettleInvoiceMsg -> f SettleInvoiceMsg

HasField CancelInvoiceMsg "paymentHash" ByteString 
Instance details

Defined in Proto.InvoiceGrpc

Methods

fieldOf :: Functor f => Proxy# "paymentHash" -> (ByteString -> f ByteString) -> CancelInvoiceMsg -> f CancelInvoiceMsg

HasField AddHoldInvoiceRequest "descriptionHash" ByteString 
Instance details

Defined in Proto.InvoiceGrpc

Methods

fieldOf :: Functor f => Proxy# "descriptionHash" -> (ByteString -> f ByteString) -> AddHoldInvoiceRequest -> f AddHoldInvoiceRequest

HasField AddHoldInvoiceRequest "hash" ByteString 
Instance details

Defined in Proto.InvoiceGrpc

HasField TrackPaymentRequest "paymentHash" ByteString 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "paymentHash" -> (ByteString -> f ByteString) -> TrackPaymentRequest -> f TrackPaymentRequest

HasField SettleEvent "preimage" ByteString 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "preimage" -> (ByteString -> f ByteString) -> SettleEvent -> f SettleEvent

HasField SendToRouteResponse "preimage" ByteString 
Instance details

Defined in Proto.RouterGrpc

HasField SendToRouteRequest "paymentHash" ByteString 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "paymentHash" -> (ByteString -> f ByteString) -> SendToRouteRequest -> f SendToRouteRequest

HasField SendPaymentRequest'DestCustomRecordsEntry "value" ByteString 
Instance details

Defined in Proto.RouterGrpc

HasField SendPaymentRequest "dest" ByteString 
Instance details

Defined in Proto.RouterGrpc

HasField SendPaymentRequest "lastHopPubkey" ByteString 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "lastHopPubkey" -> (ByteString -> f ByteString) -> SendPaymentRequest -> f SendPaymentRequest

HasField SendPaymentRequest "paymentAddr" ByteString 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "paymentAddr" -> (ByteString -> f ByteString) -> SendPaymentRequest -> f SendPaymentRequest

HasField SendPaymentRequest "paymentHash" ByteString 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "paymentHash" -> (ByteString -> f ByteString) -> SendPaymentRequest -> f SendPaymentRequest

HasField RouteFeeRequest "dest" ByteString 
Instance details

Defined in Proto.RouterGrpc

HasField QueryProbabilityRequest "fromNode" ByteString 
Instance details

Defined in Proto.RouterGrpc

HasField QueryProbabilityRequest "toNode" ByteString 
Instance details

Defined in Proto.RouterGrpc

HasField PaymentStatus "preimage" ByteString 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "preimage" -> (ByteString -> f ByteString) -> PaymentStatus -> f PaymentStatus

HasField PairHistory "nodeFrom" ByteString 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "nodeFrom" -> (ByteString -> f ByteString) -> PairHistory -> f PairHistory

HasField PairHistory "nodeTo" ByteString 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "nodeTo" -> (ByteString -> f ByteString) -> PairHistory -> f PairHistory

HasField ForwardHtlcInterceptResponse "preimage" ByteString 
Instance details

Defined in Proto.RouterGrpc

HasField ForwardHtlcInterceptRequest'CustomRecordsEntry "value" ByteString 
Instance details

Defined in Proto.RouterGrpc

HasField ForwardHtlcInterceptRequest "onionBlob" ByteString 
Instance details

Defined in Proto.RouterGrpc

HasField ForwardHtlcInterceptRequest "paymentHash" ByteString 
Instance details

Defined in Proto.RouterGrpc

HasField BuildRouteRequest "paymentAddr" ByteString 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "paymentAddr" -> (ByteString -> f ByteString) -> BuildRouteRequest -> f BuildRouteRequest

HasField UnlockWalletRequest "walletPassword" ByteString 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

fieldOf :: Functor f => Proxy# "walletPassword" -> (ByteString -> f ByteString) -> UnlockWalletRequest -> f UnlockWalletRequest

HasField InitWalletResponse "adminMacaroon" ByteString 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

fieldOf :: Functor f => Proxy# "adminMacaroon" -> (ByteString -> f ByteString) -> InitWalletResponse -> f InitWalletResponse

HasField InitWalletRequest "aezeedPassphrase" ByteString 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

fieldOf :: Functor f => Proxy# "aezeedPassphrase" -> (ByteString -> f ByteString) -> InitWalletRequest -> f InitWalletRequest

HasField InitWalletRequest "walletPassword" ByteString 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

fieldOf :: Functor f => Proxy# "walletPassword" -> (ByteString -> f ByteString) -> InitWalletRequest -> f InitWalletRequest

HasField GenSeedResponse "encipheredSeed" ByteString 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

fieldOf :: Functor f => Proxy# "encipheredSeed" -> (ByteString -> f ByteString) -> GenSeedResponse -> f GenSeedResponse

HasField GenSeedRequest "aezeedPassphrase" ByteString 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

fieldOf :: Functor f => Proxy# "aezeedPassphrase" -> (ByteString -> f ByteString) -> GenSeedRequest -> f GenSeedRequest

HasField GenSeedRequest "seedEntropy" ByteString 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

fieldOf :: Functor f => Proxy# "seedEntropy" -> (ByteString -> f ByteString) -> GenSeedRequest -> f GenSeedRequest

HasField ChangePasswordResponse "adminMacaroon" ByteString 
Instance details

Defined in Proto.WalletUnlockerGrpc

HasField ChangePasswordRequest "currentPassword" ByteString 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

fieldOf :: Functor f => Proxy# "currentPassword" -> (ByteString -> f ByteString) -> ChangePasswordRequest -> f ChangePasswordRequest

HasField ChangePasswordRequest "newPassword" ByteString 
Instance details

Defined in Proto.WalletUnlockerGrpc

HasField RestoreChanBackupRequest "maybe'multiChanBackup" (Maybe ByteString) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'multiChanBackup" -> (Maybe ByteString -> f (Maybe ByteString)) -> RestoreChanBackupRequest -> f RestoreChanBackupRequest

HasField QueryRoutesRequest "ignoredNodes" [ByteString] 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "ignoredNodes" -> ([ByteString] -> f [ByteString]) -> QueryRoutesRequest -> f QueryRoutesRequest

HasField QueryRoutesRequest "vec'ignoredNodes" (Vector ByteString) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'ignoredNodes" -> (Vector ByteString -> f (Vector ByteString)) -> QueryRoutesRequest -> f QueryRoutesRequest

HasField ChannelPoint "maybe'fundingTxidBytes" (Maybe ByteString) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'fundingTxidBytes" -> (Maybe ByteString -> f (Maybe ByteString)) -> ChannelPoint -> f ChannelPoint

HasField BuildRouteRequest "hopPubkeys" [ByteString] 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "hopPubkeys" -> ([ByteString] -> f [ByteString]) -> BuildRouteRequest -> f BuildRouteRequest

HasField BuildRouteRequest "vec'hopPubkeys" (Vector ByteString) 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'hopPubkeys" -> (Vector ByteString -> f (Vector ByteString)) -> BuildRouteRequest -> f BuildRouteRequest

HasField SendRequest "destCustomRecords" (Map Word64 ByteString) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "destCustomRecords" -> (Map Word64 ByteString -> f (Map Word64 ByteString)) -> SendRequest -> f SendRequest

HasField QueryRoutesRequest "destCustomRecords" (Map Word64 ByteString) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "destCustomRecords" -> (Map Word64 ByteString -> f (Map Word64 ByteString)) -> QueryRoutesRequest -> f QueryRoutesRequest

HasField InvoiceHTLC "customRecords" (Map Word64 ByteString) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "customRecords" -> (Map Word64 ByteString -> f (Map Word64 ByteString)) -> InvoiceHTLC -> f InvoiceHTLC

HasField Hop "customRecords" (Map Word64 ByteString) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "customRecords" -> (Map Word64 ByteString -> f (Map Word64 ByteString)) -> Hop -> f Hop

HasField SendPaymentRequest "destCustomRecords" (Map Word64 ByteString) 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "destCustomRecords" -> (Map Word64 ByteString -> f (Map Word64 ByteString)) -> SendPaymentRequest -> f SendPaymentRequest

HasField ForwardHtlcInterceptRequest "customRecords" (Map Word64 ByteString) 
Instance details

Defined in Proto.RouterGrpc

FromGrpc (TxId a) ByteString Source # 
Instance details

Defined in LndClient.Data.Newtype

ToGrpc (TxId a) ByteString Source # 
Instance details

Defined in LndClient.Data.Newtype

type State ByteString 
Instance details

Defined in Data.Attoparsec.Internal.Types

type State ByteString = Buffer
type Element ByteString 
Instance details

Defined in Universum.Container.Class

type OneItem ByteString 
Instance details

Defined in Universum.Container.Class

type ChunkElem ByteString 
Instance details

Defined in Data.Attoparsec.Internal.Types

type ChunkElem ByteString = Word8

data IntMap a #

A map of integers to values a.

Instances
Functor IntMap 
Instance details

Defined in Data.IntMap.Internal

Methods

fmap :: (a -> b) -> IntMap a -> IntMap b #

(<$) :: a -> IntMap b -> IntMap a #

Foldable IntMap 
Instance details

Defined in Data.IntMap.Internal

Methods

fold :: Monoid m => IntMap m -> m #

foldMap :: Monoid m => (a -> m) -> IntMap a -> m #

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 #

Traversable IntMap 
Instance details

Defined in Data.IntMap.Internal

Methods

traverse :: Applicative f => (a -> f b) -> IntMap a -> f (IntMap b) #

sequenceA :: Applicative f => IntMap (f a) -> f (IntMap a) #

mapM :: Monad m => (a -> m b) -> IntMap a -> m (IntMap b) #

sequence :: Monad m => IntMap (m a) -> m (IntMap a) #

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 #

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

IsList (IntMap a)

Since: containers-0.5.6.2

Instance details

Defined in Data.IntMap.Internal

Associated Types

type Item (IntMap a) :: Type #

Methods

fromList :: [Item (IntMap a)] -> IntMap a #

fromListN :: Int -> [Item (IntMap a)] -> IntMap a #

toList :: IntMap a -> [Item (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 #

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 :: (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) #

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 #

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 #

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 #

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 #

NFData a => NFData (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

rnf :: IntMap a -> () #

FromJSON a => FromJSON (IntMap a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (IntMap a) #

parseJSONList :: Value -> Parser [IntMap a] #

ToJSON a => ToJSON (IntMap a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: IntMap a -> Value

toEncoding :: IntMap a -> Encoding

toJSONList :: [IntMap a] -> Value

toEncodingList :: [IntMap a] -> Encoding

PersistField v => PersistField (IntMap v) 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: IntMap v -> PersistValue

fromPersistValue :: PersistValue -> Either Text (IntMap v)

PersistFieldSql v => PersistFieldSql (IntMap v) 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy (IntMap v) -> SqlType

Container (IntMap v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (IntMap v) :: Type #

Methods

toList :: IntMap v -> [Element (IntMap v)] #

null :: IntMap v -> Bool #

foldr :: (Element (IntMap v) -> b -> b) -> b -> IntMap v -> b #

foldl :: (b -> Element (IntMap v) -> b) -> b -> IntMap v -> b #

foldl' :: (b -> Element (IntMap v) -> b) -> b -> IntMap v -> b #

length :: IntMap v -> Int #

elem :: Element (IntMap v) -> IntMap v -> Bool #

maximum :: IntMap v -> Element (IntMap v) #

minimum :: IntMap v -> Element (IntMap v) #

foldMap :: Monoid m => (Element (IntMap v) -> m) -> IntMap v -> m #

fold :: IntMap v -> Element (IntMap v) #

foldr' :: (Element (IntMap v) -> b -> b) -> b -> IntMap v -> b #

foldr1 :: (Element (IntMap v) -> Element (IntMap v) -> Element (IntMap v)) -> IntMap v -> Element (IntMap v) #

foldl1 :: (Element (IntMap v) -> Element (IntMap v) -> Element (IntMap v)) -> IntMap v -> Element (IntMap v) #

notElem :: Element (IntMap v) -> IntMap v -> Bool #

all :: (Element (IntMap v) -> Bool) -> IntMap v -> Bool #

any :: (Element (IntMap v) -> Bool) -> IntMap v -> Bool #

and :: IntMap v -> Bool #

or :: IntMap v -> Bool #

find :: (Element (IntMap v) -> Bool) -> IntMap v -> Maybe (Element (IntMap v)) #

safeHead :: IntMap v -> Maybe (Element (IntMap v)) #

One (IntMap v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (IntMap v) :: Type #

Methods

one :: OneItem (IntMap v) -> IntMap v #

ToPairs (IntMap v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Key (IntMap v) :: Type #

type Val (IntMap v) :: Type #

Methods

toPairs :: IntMap v -> [(Key (IntMap v), Val (IntMap v))] #

keys :: IntMap v -> [Key (IntMap v)] #

elems :: IntMap v -> [Val (IntMap v)] #

type Item (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

type Item (IntMap a) = (Key, a)
type Element (IntMap v) 
Instance details

Defined in Universum.Container.Class

type Element (IntMap v) = ElementDefault (IntMap v)
type OneItem (IntMap v) 
Instance details

Defined in Universum.Container.Class

type OneItem (IntMap v) = (Int, v)
type Key (IntMap v) 
Instance details

Defined in Universum.Container.Class

type Key (IntMap v) = Int
type Val (IntMap v) 
Instance details

Defined in Universum.Container.Class

type Val (IntMap v) = v

data IntSet #

A set of integers.

Instances
IsList IntSet

Since: containers-0.5.6.2

Instance details

Defined in Data.IntSet.Internal

Associated Types

type Item IntSet :: Type #

Eq IntSet 
Instance details

Defined in Data.IntSet.Internal

Methods

(==) :: IntSet -> IntSet -> Bool #

(/=) :: IntSet -> IntSet -> Bool #

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 :: (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 #

Ord IntSet 
Instance details

Defined in Data.IntSet.Internal

Read IntSet 
Instance details

Defined in Data.IntSet.Internal

Show IntSet 
Instance details

Defined in Data.IntSet.Internal

Semigroup IntSet

Since: containers-0.5.7

Instance details

Defined in Data.IntSet.Internal

Monoid IntSet 
Instance details

Defined in Data.IntSet.Internal

NFData IntSet 
Instance details

Defined in Data.IntSet.Internal

Methods

rnf :: IntSet -> () #

FromJSON IntSet 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser IntSet #

parseJSONList :: Value -> Parser [IntSet] #

ToJSON IntSet 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: IntSet -> Value

toEncoding :: IntSet -> Encoding

toJSONList :: [IntSet] -> Value

toEncodingList :: [IntSet] -> Encoding

Container IntSet 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element IntSet :: Type #

One IntSet 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem IntSet :: Type #

Methods

one :: OneItem IntSet -> IntSet #

type Item IntSet 
Instance details

Defined in Data.IntSet.Internal

type Item IntSet = Key
type Element IntSet 
Instance details

Defined in Universum.Container.Class

type OneItem IntSet 
Instance details

Defined in Universum.Container.Class

data Map k a #

A Map from keys k to values a.

Instances
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 #

HasField WalletBalanceResponse "accountBalance" (Map Text WalletAccountBalance) 
Instance details

Defined in Proto.LndGrpc

HasField SendRequest "destCustomRecords" (Map Word64 ByteString) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "destCustomRecords" -> (Map Word64 ByteString -> f (Map Word64 ByteString)) -> SendRequest -> f SendRequest

HasField SendManyRequest "addrToAmount" (Map Text Int64) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "addrToAmount" -> (Map Text Int64 -> f (Map Text Int64)) -> SendManyRequest -> f SendManyRequest

HasField QueryRoutesRequest "destCustomRecords" (Map Word64 ByteString) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "destCustomRecords" -> (Map Word64 ByteString -> f (Map Word64 ByteString)) -> QueryRoutesRequest -> f QueryRoutesRequest

HasField Peer "features" (Map Word32 Feature) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "features" -> (Map Word32 Feature -> f (Map Word32 Feature)) -> Peer -> f Peer

HasField PayReq "features" (Map Word32 Feature) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "features" -> (Map Word32 Feature -> f (Map Word32 Feature)) -> PayReq -> f PayReq

HasField NodeUpdate "features" (Map Word32 Feature) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "features" -> (Map Word32 Feature -> f (Map Word32 Feature)) -> NodeUpdate -> f NodeUpdate

HasField NodeMetricsResponse "betweennessCentrality" (Map Text FloatMetric) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "betweennessCentrality" -> (Map Text FloatMetric -> f (Map Text FloatMetric)) -> NodeMetricsResponse -> f NodeMetricsResponse

HasField ListPermissionsResponse "methodPermissions" (Map Text MacaroonPermissionList) 
Instance details

Defined in Proto.LndGrpc

HasField LightningNode "features" (Map Word32 Feature) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "features" -> (Map Word32 Feature -> f (Map Word32 Feature)) -> LightningNode -> f LightningNode

HasField InvoiceHTLC "customRecords" (Map Word64 ByteString) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "customRecords" -> (Map Word64 ByteString -> f (Map Word64 ByteString)) -> InvoiceHTLC -> f InvoiceHTLC

HasField Invoice "features" (Map Word32 Feature) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "features" -> (Map Word32 Feature -> f (Map Word32 Feature)) -> Invoice -> f Invoice

HasField Hop "customRecords" (Map Word64 ByteString) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "customRecords" -> (Map Word64 ByteString -> f (Map Word64 ByteString)) -> Hop -> f Hop

HasField GetInfoResponse "features" (Map Word32 Feature) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "features" -> (Map Word32 Feature -> f (Map Word32 Feature)) -> GetInfoResponse -> f GetInfoResponse

HasField EstimateFeeRequest "addrToAmount" (Map Text Int64) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "addrToAmount" -> (Map Text Int64 -> f (Map Text Int64)) -> EstimateFeeRequest -> f EstimateFeeRequest

HasField SendPaymentRequest "destCustomRecords" (Map Word64 ByteString) 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "destCustomRecords" -> (Map Word64 ByteString -> f (Map Word64 ByteString)) -> SendPaymentRequest -> f SendPaymentRequest

HasField ForwardHtlcInterceptRequest "customRecords" (Map Word64 ByteString) 
Instance details

Defined in Proto.RouterGrpc

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 #

Foldable (Map k) 
Instance details

Defined in Data.Map.Internal

Methods

fold :: Monoid m => Map k m -> m #

foldMap :: Monoid m => (a -> m) -> Map k a -> m #

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 #

Traversable (Map k) 
Instance details

Defined in Data.Map.Internal

Methods

traverse :: Applicative f => (a -> f b) -> Map k a -> f (Map k b) #

sequenceA :: Applicative f => Map k (f a) -> f (Map k a) #

mapM :: Monad m => (a -> m b) -> Map k a -> m (Map k b) #

sequence :: Monad m => Map k (m a) -> m (Map k a) #

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 #

(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

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) :: Type #

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)] #

(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 #

(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 :: (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, 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 #

(Ord k, Read k, Read e) => Read (Map k e) 
Instance details

Defined in Data.Map.Internal

Methods

readsPrec :: Int -> ReadS (Map k e) #

readList :: ReadS [Map k e] #

readPrec :: ReadPrec (Map k e) #

readListPrec :: ReadPrec [Map k e] #

(Show k, Show a) => Show (Map k a) 
Instance details

Defined in Data.Map.Internal

Methods

showsPrec :: Int -> Map k a -> ShowS #

show :: Map k a -> String #

showList :: [Map k a] -> ShowS #

Ord k => 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 => 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 #

(NFData k, NFData a) => NFData (Map k a) 
Instance details

Defined in Data.Map.Internal

Methods

rnf :: Map k a -> () #

(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

PersistField v => PersistField (Map Text v) 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Map Text v -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Map Text v)

PersistFieldSql v => PersistFieldSql (Map Text v) 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy (Map Text v) -> SqlType

Container (Map k v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Map k v) :: Type #

Methods

toList :: Map k v -> [Element (Map k v)] #

null :: Map k v -> Bool #

foldr :: (Element (Map k v) -> b -> b) -> b -> Map k v -> b #

foldl :: (b -> Element (Map k v) -> b) -> b -> Map k v -> b #

foldl' :: (b -> Element (Map k v) -> b) -> b -> Map k v -> b #

length :: Map k v -> Int #

elem :: Element (Map k v) -> Map k v -> Bool #

maximum :: Map k v -> Element (Map k v) #

minimum :: Map k v -> Element (Map k v) #

foldMap :: Monoid m => (Element (Map k v) -> m) -> Map k v -> m #

fold :: Map k v -> Element (Map k v) #

foldr' :: (Element (Map k v) -> b -> b) -> b -> Map k v -> b #

foldr1 :: (Element (Map k v) -> Element (Map k v) -> Element (Map k v)) -> Map k v -> Element (Map k v) #

foldl1 :: (Element (Map k v) -> Element (Map k v) -> Element (Map k v)) -> Map k v -> Element (Map k v) #

notElem :: Element (Map k v) -> Map k v -> Bool #

all :: (Element (Map k v) -> Bool) -> Map k v -> Bool #

any :: (Element (Map k v) -> Bool) -> Map k v -> Bool #

and :: Map k v -> Bool #

or :: Map k v -> Bool #

find :: (Element (Map k v) -> Bool) -> Map k v -> Maybe (Element (Map k v)) #

safeHead :: Map k v -> Maybe (Element (Map k v)) #

One (Map k v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (Map k v) :: Type #

Methods

one :: OneItem (Map k v) -> Map k v #

ToPairs (Map k v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Key (Map k v) :: Type #

type Val (Map k v) :: Type #

Methods

toPairs :: Map k v -> [(Key (Map k v), Val (Map k v))] #

keys :: Map k v -> [Key (Map k v)] #

elems :: Map k v -> [Val (Map k v)] #

type Item (Map k v) 
Instance details

Defined in Data.Map.Internal

type Item (Map k v) = (k, v)
type Element (Map k v) 
Instance details

Defined in Universum.Container.Class

type Element (Map k v) = ElementDefault (Map k v)
type OneItem (Map k v) 
Instance details

Defined in Universum.Container.Class

type OneItem (Map k v) = (k, v)
type Key (Map k v) 
Instance details

Defined in Universum.Container.Class

type Key (Map k v) = k
type Val (Map k v) 
Instance details

Defined in Universum.Container.Class

type Val (Map k v) = v

data Seq a #

General-purpose finite sequences.

Instances
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 #

fail :: String -> Seq a #

Functor Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

fmap :: (a -> b) -> Seq a -> Seq b #

(<$) :: a -> Seq b -> Seq a #

MonadFix Seq

Since: containers-0.5.11

Instance details

Defined in Data.Sequence.Internal

Methods

mfix :: (a -> 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 #

Foldable Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

fold :: Monoid m => Seq m -> 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 #

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) #

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 #

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) #

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] #

MonadPlus Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

mzero :: Seq a #

mplus :: Seq 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

UnzipWith Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

unzipWith' :: (x -> (a, b)) -> Seq x -> (Seq a, Seq b)

IsList (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Associated Types

type Item (Seq a) :: Type #

Methods

fromList :: [Item (Seq a)] -> Seq a #

fromListN :: Int -> [Item (Seq a)] -> Seq a #

toList :: Seq a -> [Item (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 #

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 :: (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) #

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 #

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 #

a ~ Char => IsString (Seq a)

Since: containers-0.5.7

Instance details

Defined in Data.Sequence.Internal

Methods

fromString :: String -> 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 #

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 #

NFData a => NFData (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

rnf :: Seq a -> () #

FromJSON a => FromJSON (Seq a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Seq a) #

parseJSONList :: Value -> Parser [Seq a] #

ToJSON a => ToJSON (Seq a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Seq a -> Value

toEncoding :: Seq a -> Encoding

toJSONList :: [Seq a] -> Value

toEncodingList :: [Seq a] -> Encoding

Container (Seq a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Seq a) :: Type #

Methods

toList :: Seq a -> [Element (Seq a)] #

null :: Seq a -> Bool #

foldr :: (Element (Seq a) -> b -> b) -> b -> Seq a -> b #

foldl :: (b -> Element (Seq a) -> b) -> b -> Seq a -> b #

foldl' :: (b -> Element (Seq a) -> b) -> b -> Seq a -> b #

length :: Seq a -> Int #

elem :: Element (Seq a) -> Seq a -> Bool #

maximum :: Seq a -> Element (Seq a) #

minimum :: Seq a -> Element (Seq a) #

foldMap :: Monoid m => (Element (Seq a) -> m) -> Seq a -> m #

fold :: Seq a -> Element (Seq a) #

foldr' :: (Element (Seq a) -> b -> b) -> b -> Seq a -> b #

foldr1 :: (Element (Seq a) -> Element (Seq a) -> Element (Seq a)) -> Seq a -> Element (Seq a) #

foldl1 :: (Element (Seq a) -> Element (Seq a) -> Element (Seq a)) -> Seq a -> Element (Seq a) #

notElem :: Element (Seq a) -> Seq a -> Bool #

all :: (Element (Seq a) -> Bool) -> Seq a -> Bool #

any :: (Element (Seq a) -> Bool) -> Seq a -> Bool #

and :: Seq a -> Bool #

or :: Seq a -> Bool #

find :: (Element (Seq a) -> Bool) -> Seq a -> Maybe (Element (Seq a)) #

safeHead :: Seq a -> Maybe (Element (Seq a)) #

One (Seq a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (Seq a) :: Type #

Methods

one :: OneItem (Seq a) -> Seq a #

type Item (Seq a) 
Instance details

Defined in Data.Sequence.Internal

type Item (Seq a) = a
type Element (Seq a) 
Instance details

Defined in Universum.Container.Class

type Element (Seq a) = ElementDefault (Seq a)
type OneItem (Seq a) 
Instance details

Defined in Universum.Container.Class

type OneItem (Seq a) = a

data Set a #

A set of values a.

Instances
Foldable Set 
Instance details

Defined in Data.Set.Internal

Methods

fold :: Monoid m => Set m -> 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 #

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

Ord a => IsList (Set a)

Since: containers-0.5.6.2

Instance details

Defined in Data.Set.Internal

Associated Types

type Item (Set a) :: Type #

Methods

fromList :: [Item (Set a)] -> Set a #

fromListN :: Int -> [Item (Set a)] -> Set a #

toList :: Set a -> [Item (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 #

(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 :: (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 => 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 #

(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 #

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 => 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 #

NFData a => NFData (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

rnf :: Set a -> () #

(Ord a, FromJSON a) => FromJSON (Set a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Set a) #

parseJSONList :: Value -> Parser [Set a] #

ToJSON a => ToJSON (Set a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Set a -> Value

toEncoding :: Set a -> Encoding

toJSONList :: [Set a] -> Value

toEncodingList :: [Set a] -> Encoding

(Ord a, PersistField a) => PersistField (Set a) 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Set a -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Set a)

(Ord a, PersistFieldSql a) => PersistFieldSql (Set a) 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy (Set a) -> SqlType

Ord v => Container (Set v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Set v) :: Type #

Methods

toList :: Set v -> [Element (Set v)] #

null :: Set v -> Bool #

foldr :: (Element (Set v) -> b -> b) -> b -> Set v -> b #

foldl :: (b -> Element (Set v) -> b) -> b -> Set v -> b #

foldl' :: (b -> Element (Set v) -> b) -> b -> Set v -> b #

length :: Set v -> Int #

elem :: Element (Set v) -> Set v -> Bool #

maximum :: Set v -> Element (Set v) #

minimum :: Set v -> Element (Set v) #

foldMap :: Monoid m => (Element (Set v) -> m) -> Set v -> m #

fold :: Set v -> Element (Set v) #

foldr' :: (Element (Set v) -> b -> b) -> b -> Set v -> b #

foldr1 :: (Element (Set v) -> Element (Set v) -> Element (Set v)) -> Set v -> Element (Set v) #

foldl1 :: (Element (Set v) -> Element (Set v) -> Element (Set v)) -> Set v -> Element (Set v) #

notElem :: Element (Set v) -> Set v -> Bool #

all :: (Element (Set v) -> Bool) -> Set v -> Bool #

any :: (Element (Set v) -> Bool) -> Set v -> Bool #

and :: Set v -> Bool #

or :: Set v -> Bool #

find :: (Element (Set v) -> Bool) -> Set v -> Maybe (Element (Set v)) #

safeHead :: Set v -> Maybe (Element (Set v)) #

One (Set v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (Set v) :: Type #

Methods

one :: OneItem (Set v) -> Set v #

type Item (Set a) 
Instance details

Defined in Data.Set.Internal

type Item (Set a) = a
type Element (Set v) 
Instance details

Defined in Universum.Container.Class

type Element (Set v) = ElementDefault (Set v)
type OneItem (Set v) 
Instance details

Defined in Universum.Container.Class

type OneItem (Set v) = v

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

($!!) :: 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

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

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
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 Int8 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int8 -> () #

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 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 Ordering 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Ordering -> () #

NFData Word 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word -> () #

NFData Word8 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word8 -> () #

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 CallStack

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CallStack -> () #

NFData () 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: () -> () #

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 Void

Defined as rnf = absurd.

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Void -> () #

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 ThreadId

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: ThreadId -> () #

NFData ExitCode

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: ExitCode -> () #

NFData MaskingState

Since: deepseq-1.4.4.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: MaskingState -> () #

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 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 CChar

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CChar -> () #

NFData CSChar

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CSChar -> () #

NFData CUChar

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CUChar -> () #

NFData CShort

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CShort -> () #

NFData CUShort

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CUShort -> () #

NFData CInt

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CInt -> () #

NFData CUInt

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CUInt -> () #

NFData CLong

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CLong -> () #

NFData CULong

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CULong -> () #

NFData CLLong

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CLLong -> () #

NFData CULLong

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CULLong -> () #

NFData CBool

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CBool -> () #

NFData CFloat

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CFloat -> () #

NFData CDouble

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CDouble -> () #

NFData CPtrdiff

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CPtrdiff -> () #

NFData CSize

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CSize -> () #

NFData CWchar

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CWchar -> () #

NFData CSigAtomic

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CSigAtomic -> () #

NFData CClock

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CClock -> () #

NFData CTime

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CTime -> () #

NFData CUSeconds

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CUSeconds -> () #

NFData CSUSeconds

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CSUSeconds -> () #

NFData CFile

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CFile -> () #

NFData CFpos

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CFpos -> () #

NFData CJmpBuf

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CJmpBuf -> () #

NFData CIntPtr

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CIntPtr -> () #

NFData CUIntPtr

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CUIntPtr -> () #

NFData CIntMax

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CIntMax -> () #

NFData CUIntMax

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CUIntMax -> () #

NFData Fingerprint

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Fingerprint -> () #

NFData SrcLoc

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: SrcLoc -> () #

NFData ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Methods

rnf :: ByteString -> () #

NFData ByteString 
Instance details

Defined in Data.ByteString.Internal

Methods

rnf :: ByteString -> () #

NFData IntSet 
Instance details

Defined in Data.IntSet.Internal

Methods

rnf :: IntSet -> () #

NFData Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Methods

rnf :: Doc -> () #

NFData TextDetails 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

rnf :: TextDetails -> () #

NFData UnicodeException 
Instance details

Defined in Data.Text.Encoding.Error

Methods

rnf :: UnicodeException -> () #

NFData ZonedTime 
Instance details

Defined in Data.Time.LocalTime.Internal.ZonedTime

Methods

rnf :: ZonedTime -> () #

NFData LocalTime 
Instance details

Defined in Data.Time.LocalTime.Internal.LocalTime

Methods

rnf :: LocalTime -> () #

NFData UniversalTime 
Instance details

Defined in Data.Time.Clock.Internal.UniversalTime

Methods

rnf :: UniversalTime -> () #

NFData UTCTime 
Instance details

Defined in Data.Time.Clock.Internal.UTCTime

Methods

rnf :: UTCTime -> () #

NFData AbsoluteTime 
Instance details

Defined in Data.Time.Clock.Internal.AbsoluteTime

Methods

rnf :: AbsoluteTime -> () #

NFData Day 
Instance details

Defined in Data.Time.Calendar.Days

Methods

rnf :: Day -> () #

NFData Value 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

rnf :: Value -> () #

NFData JSONPathElement 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

rnf :: JSONPathElement -> () #

NFData Scientific 
Instance details

Defined in Data.Scientific

Methods

rnf :: Scientific -> () #

NFData UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

rnf :: UUID -> () #

NFData Tag 
Instance details

Defined in Data.ProtoLens.Encoding.Wire

Methods

rnf :: Tag -> () #

NFData TaggedValue 
Instance details

Defined in Data.ProtoLens.Encoding.Wire

Methods

rnf :: TaggedValue -> () #

NFData DynamicImage 
Instance details

Defined in Codec.Picture.Types

Methods

rnf :: DynamicImage -> () #

NFData WireValue 
Instance details

Defined in Data.ProtoLens.Encoding.Wire

Methods

rnf :: WireValue -> () #

NFData WalletBalanceResponse'AccountBalanceEntry Source # 
Instance details

Defined in Proto.LndGrpc

NFData WalletBalanceResponse Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: WalletBalanceResponse -> () #

NFData WalletBalanceRequest Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: WalletBalanceRequest -> () #

NFData WalletAccountBalance Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: WalletAccountBalance -> () #

NFData VerifyMessageResponse Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: VerifyMessageResponse -> () #

NFData VerifyMessageRequest Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: VerifyMessageRequest -> () #

NFData VerifyChanBackupResponse Source # 
Instance details

Defined in Proto.LndGrpc

NFData Utxo Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: Utxo -> () #

NFData TransactionDetails Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: TransactionDetails -> () #

NFData Transaction Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: Transaction -> () #

NFData TimestampedError Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: TimestampedError -> () #

NFData StopResponse Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: StopResponse -> () #

NFData StopRequest Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: StopRequest -> () #

NFData SignMessageResponse Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: SignMessageResponse -> () #

NFData SignMessageRequest Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: SignMessageRequest -> () #

NFData SendToRouteRequest Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: SendToRouteRequest -> () #

NFData SendResponse Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: SendResponse -> () #

NFData SendRequest'DestCustomRecordsEntry Source # 
Instance details

Defined in Proto.LndGrpc

NFData SendRequest Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: SendRequest -> () #

NFData SendManyResponse Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: SendManyResponse -> () #

NFData SendManyRequest'AddrToAmountEntry Source # 
Instance details

Defined in Proto.LndGrpc

NFData SendManyRequest Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: SendManyRequest -> () #

NFData SendCoinsResponse Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: SendCoinsResponse -> () #

NFData SendCoinsRequest Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: SendCoinsRequest -> () #

NFData RoutingPolicy Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: RoutingPolicy -> () #

NFData RouteHint Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: RouteHint -> () #

NFData Route Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: Route -> () #

NFData RestoreChanBackupRequest'Backup Source # 
Instance details

Defined in Proto.LndGrpc

NFData RestoreChanBackupRequest Source # 
Instance details

Defined in Proto.LndGrpc

NFData RestoreBackupResponse Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: RestoreBackupResponse -> () #

NFData ResolutionType Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ResolutionType -> () #

NFData ResolutionOutcome Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ResolutionOutcome -> () #

NFData Resolution Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: Resolution -> () #

NFData ReadyForPsbtFunding Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ReadyForPsbtFunding -> () #

NFData QueryRoutesResponse Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: QueryRoutesResponse -> () #

NFData QueryRoutesRequest'DestCustomRecordsEntry Source # 
Instance details

Defined in Proto.LndGrpc

NFData QueryRoutesRequest Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: QueryRoutesRequest -> () #

NFData PsbtShim Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: PsbtShim -> () #

NFData PolicyUpdateResponse Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: PolicyUpdateResponse -> () #

NFData PolicyUpdateRequest'Scope Source # 
Instance details

Defined in Proto.LndGrpc

NFData PolicyUpdateRequest Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: PolicyUpdateRequest -> () #

NFData PendingUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: PendingUpdate -> () #

NFData PendingHTLC Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: PendingHTLC -> () #

NFData PendingChannelsResponse'WaitingCloseChannel Source # 
Instance details

Defined in Proto.LndGrpc

NFData PendingChannelsResponse'PendingOpenChannel Source # 
Instance details

Defined in Proto.LndGrpc

NFData PendingChannelsResponse'PendingChannel Source # 
Instance details

Defined in Proto.LndGrpc

NFData PendingChannelsResponse'ForceClosedChannel'AnchorState Source # 
Instance details

Defined in Proto.LndGrpc

NFData PendingChannelsResponse'ForceClosedChannel Source # 
Instance details

Defined in Proto.LndGrpc

NFData PendingChannelsResponse'Commitments Source # 
Instance details

Defined in Proto.LndGrpc

NFData PendingChannelsResponse'ClosedChannel Source # 
Instance details

Defined in Proto.LndGrpc

NFData PendingChannelsResponse Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: PendingChannelsResponse -> () #

NFData PendingChannelsRequest Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: PendingChannelsRequest -> () #

NFData PeerEventSubscription Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: PeerEventSubscription -> () #

NFData PeerEvent'EventType Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: PeerEvent'EventType -> () #

NFData PeerEvent Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: PeerEvent -> () #

NFData Peer'SyncType Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: Peer'SyncType -> () #

NFData Peer'FeaturesEntry Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: Peer'FeaturesEntry -> () #

NFData Peer Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: Peer -> () #

NFData PaymentHash Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: PaymentHash -> () #

NFData PaymentFailureReason Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: PaymentFailureReason -> () #

NFData Payment'PaymentStatus Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: Payment'PaymentStatus -> () #

NFData Payment Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: Payment -> () #

NFData PayReqString Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: PayReqString -> () #

NFData PayReq'FeaturesEntry Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: PayReq'FeaturesEntry -> () #

NFData PayReq Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: PayReq -> () #

NFData OutPoint Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: OutPoint -> () #

NFData OpenStatusUpdate'Update Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: OpenStatusUpdate'Update -> () #

NFData OpenStatusUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: OpenStatusUpdate -> () #

NFData OpenChannelRequest Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: OpenChannelRequest -> () #

NFData Op Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: Op -> () #

NFData NodeUpdate'FeaturesEntry Source # 
Instance details

Defined in Proto.LndGrpc

NFData NodeUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: NodeUpdate -> () #

NFData NodePair Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: NodePair -> () #

NFData NodeMetricsResponse'BetweennessCentralityEntry Source # 
Instance details

Defined in Proto.LndGrpc

NFData NodeMetricsResponse Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: NodeMetricsResponse -> () #

NFData NodeMetricsRequest Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: NodeMetricsRequest -> () #

NFData NodeMetricType Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: NodeMetricType -> () #

NFData NodeInfoRequest Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: NodeInfoRequest -> () #

NFData NodeInfo Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: NodeInfo -> () #

NFData NodeAddress Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: NodeAddress -> () #

NFData NewAddressResponse Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: NewAddressResponse -> () #

NFData NewAddressRequest Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: NewAddressRequest -> () #

NFData NetworkInfoRequest Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: NetworkInfoRequest -> () #

NFData NetworkInfo Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: NetworkInfo -> () #

NFData MultiChanBackup Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: MultiChanBackup -> () #

NFData MacaroonPermissionList Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: MacaroonPermissionList -> () #

NFData MacaroonPermission Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: MacaroonPermission -> () #

NFData MacaroonId Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: MacaroonId -> () #

NFData MPPRecord Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: MPPRecord -> () #

NFData ListUnspentResponse Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ListUnspentResponse -> () #

NFData ListUnspentRequest Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ListUnspentRequest -> () #

NFData ListPermissionsResponse'MethodPermissionsEntry Source # 
Instance details

Defined in Proto.LndGrpc

NFData ListPermissionsResponse Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ListPermissionsResponse -> () #

NFData ListPermissionsRequest Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ListPermissionsRequest -> () #

NFData ListPeersResponse Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ListPeersResponse -> () #

NFData ListPeersRequest Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ListPeersRequest -> () #

NFData ListPaymentsResponse Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ListPaymentsResponse -> () #

NFData ListPaymentsRequest Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ListPaymentsRequest -> () #

NFData ListMacaroonIDsResponse Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ListMacaroonIDsResponse -> () #

NFData ListMacaroonIDsRequest Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ListMacaroonIDsRequest -> () #

NFData ListInvoiceResponse Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ListInvoiceResponse -> () #

NFData ListInvoiceRequest Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ListInvoiceRequest -> () #

NFData ListChannelsResponse Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ListChannelsResponse -> () #

NFData ListChannelsRequest Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ListChannelsRequest -> () #

NFData LightningNode'FeaturesEntry Source # 
Instance details

Defined in Proto.LndGrpc

NFData LightningNode Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: LightningNode -> () #

NFData LightningAddress Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: LightningAddress -> () #

NFData KeyLocator Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: KeyLocator -> () #

NFData KeyDescriptor Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: KeyDescriptor -> () #

NFData InvoiceSubscription Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: InvoiceSubscription -> () #

NFData InvoiceHTLCState Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: InvoiceHTLCState -> () #

NFData InvoiceHTLC'CustomRecordsEntry Source # 
Instance details

Defined in Proto.LndGrpc

NFData InvoiceHTLC Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: InvoiceHTLC -> () #

NFData Invoice'InvoiceState Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: Invoice'InvoiceState -> () #

NFData Invoice'FeaturesEntry Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: Invoice'FeaturesEntry -> () #

NFData Invoice Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: Invoice -> () #

NFData Initiator Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: Initiator -> () #

NFData HopHint Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: HopHint -> () #

NFData Hop'CustomRecordsEntry Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: Hop'CustomRecordsEntry -> () #

NFData Hop Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: Hop -> () #

NFData HTLCAttempt'HTLCStatus Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: HTLCAttempt'HTLCStatus -> () #

NFData HTLCAttempt Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: HTLCAttempt -> () #

NFData HTLC Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: HTLC -> () #

NFData GraphTopologyUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: GraphTopologyUpdate -> () #

NFData GraphTopologySubscription Source # 
Instance details

Defined in Proto.LndGrpc

NFData GetTransactionsRequest Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: GetTransactionsRequest -> () #

NFData GetRecoveryInfoResponse Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: GetRecoveryInfoResponse -> () #

NFData GetRecoveryInfoRequest Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: GetRecoveryInfoRequest -> () #

NFData GetInfoResponse'FeaturesEntry Source # 
Instance details

Defined in Proto.LndGrpc

NFData GetInfoResponse Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: GetInfoResponse -> () #

NFData GetInfoRequest Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: GetInfoRequest -> () #

NFData FundingTransitionMsg'Trigger Source # 
Instance details

Defined in Proto.LndGrpc

NFData FundingTransitionMsg Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: FundingTransitionMsg -> () #

NFData FundingStateStepResp Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: FundingStateStepResp -> () #

NFData FundingShimCancel Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: FundingShimCancel -> () #

NFData FundingShim'Shim Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: FundingShim'Shim -> () #

NFData FundingShim Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: FundingShim -> () #

NFData FundingPsbtVerify Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: FundingPsbtVerify -> () #

NFData FundingPsbtFinalize Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: FundingPsbtFinalize -> () #

NFData ForwardingHistoryResponse Source # 
Instance details

Defined in Proto.LndGrpc

NFData ForwardingHistoryRequest Source # 
Instance details

Defined in Proto.LndGrpc

NFData ForwardingEvent Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ForwardingEvent -> () #

NFData FloatMetric Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: FloatMetric -> () #

NFData FeeReportResponse Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: FeeReportResponse -> () #

NFData FeeReportRequest Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: FeeReportRequest -> () #

NFData FeeLimit'Limit Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: FeeLimit'Limit -> () #

NFData FeeLimit Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: FeeLimit -> () #

NFData FeatureBit Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: FeatureBit -> () #

NFData Feature Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: Feature -> () #

NFData Failure'FailureCode Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: Failure'FailureCode -> () #

NFData Failure Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: Failure -> () #

NFData ExportChannelBackupRequest Source # 
Instance details

Defined in Proto.LndGrpc

NFData EstimateFeeResponse Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: EstimateFeeResponse -> () #

NFData EstimateFeeRequest'AddrToAmountEntry Source # 
Instance details

Defined in Proto.LndGrpc

NFData EstimateFeeRequest Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: EstimateFeeRequest -> () #

NFData EdgeLocator Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: EdgeLocator -> () #

NFData DisconnectPeerResponse Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: DisconnectPeerResponse -> () #

NFData DisconnectPeerRequest Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: DisconnectPeerRequest -> () #

NFData DeleteMacaroonIDResponse Source # 
Instance details

Defined in Proto.LndGrpc

NFData DeleteMacaroonIDRequest Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: DeleteMacaroonIDRequest -> () #

NFData DeleteAllPaymentsResponse Source # 
Instance details

Defined in Proto.LndGrpc

NFData DeleteAllPaymentsRequest Source # 
Instance details

Defined in Proto.LndGrpc

NFData DebugLevelResponse Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: DebugLevelResponse -> () #

NFData DebugLevelRequest Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: DebugLevelRequest -> () #

NFData ConnectPeerResponse Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ConnectPeerResponse -> () #

NFData ConnectPeerRequest Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ConnectPeerRequest -> () #

NFData ConfirmationUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ConfirmationUpdate -> () #

NFData CommitmentType Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: CommitmentType -> () #

NFData ClosedChannelsResponse Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ClosedChannelsResponse -> () #

NFData ClosedChannelsRequest Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ClosedChannelsRequest -> () #

NFData ClosedChannelUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ClosedChannelUpdate -> () #

NFData CloseStatusUpdate'Update Source # 
Instance details

Defined in Proto.LndGrpc

NFData CloseStatusUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: CloseStatusUpdate -> () #

NFData CloseChannelRequest Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: CloseChannelRequest -> () #

NFData ChannelUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ChannelUpdate -> () #

NFData ChannelPoint'FundingTxid Source # 
Instance details

Defined in Proto.LndGrpc

NFData ChannelPoint Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ChannelPoint -> () #

NFData ChannelOpenUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ChannelOpenUpdate -> () #

NFData ChannelGraphRequest Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ChannelGraphRequest -> () #

NFData ChannelGraph Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ChannelGraph -> () #

NFData ChannelFeeReport Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ChannelFeeReport -> () #

NFData ChannelEventUpdate'UpdateType Source # 
Instance details

Defined in Proto.LndGrpc

NFData ChannelEventUpdate'Channel Source # 
Instance details

Defined in Proto.LndGrpc

NFData ChannelEventUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ChannelEventUpdate -> () #

NFData ChannelEventSubscription Source # 
Instance details

Defined in Proto.LndGrpc

NFData ChannelEdgeUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ChannelEdgeUpdate -> () #

NFData ChannelEdge Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ChannelEdge -> () #

NFData ChannelConstraints Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ChannelConstraints -> () #

NFData ChannelCloseUpdate Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ChannelCloseUpdate -> () #

NFData ChannelCloseSummary'ClosureType Source # 
Instance details

Defined in Proto.LndGrpc

NFData ChannelCloseSummary Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ChannelCloseSummary -> () #

NFData ChannelBalanceResponse Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ChannelBalanceResponse -> () #

NFData ChannelBalanceRequest Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ChannelBalanceRequest -> () #

NFData ChannelBackups Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ChannelBackups -> () #

NFData ChannelBackupSubscription Source # 
Instance details

Defined in Proto.LndGrpc

NFData ChannelBackup Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ChannelBackup -> () #

NFData ChannelAcceptResponse Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ChannelAcceptResponse -> () #

NFData ChannelAcceptRequest Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ChannelAcceptRequest -> () #

NFData Channel Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: Channel -> () #

NFData ChanPointShim Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ChanPointShim -> () #

NFData ChanInfoRequest Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ChanInfoRequest -> () #

NFData ChanBackupSnapshot Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ChanBackupSnapshot -> () #

NFData ChanBackupExportRequest Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: ChanBackupExportRequest -> () #

NFData Chain Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: Chain -> () #

NFData BakeMacaroonResponse Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: BakeMacaroonResponse -> () #

NFData BakeMacaroonRequest Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: BakeMacaroonRequest -> () #

NFData Amount Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: Amount -> () #

NFData AddressType Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: AddressType -> () #

NFData AddInvoiceResponse Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: AddInvoiceResponse -> () #

NFData AbandonChannelResponse Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: AbandonChannelResponse -> () #

NFData AbandonChannelRequest Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: AbandonChannelRequest -> () #

NFData AMPRecord Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: AMPRecord -> () #

NFData AMP Source # 
Instance details

Defined in Proto.LndGrpc

Methods

rnf :: AMP -> () #

NFData SubscribeSingleInvoiceRequest Source # 
Instance details

Defined in Proto.InvoiceGrpc

NFData SettleInvoiceResp Source # 
Instance details

Defined in Proto.InvoiceGrpc

Methods

rnf :: SettleInvoiceResp -> () #

NFData SettleInvoiceMsg Source # 
Instance details

Defined in Proto.InvoiceGrpc

Methods

rnf :: SettleInvoiceMsg -> () #

NFData CancelInvoiceResp Source # 
Instance details

Defined in Proto.InvoiceGrpc

Methods

rnf :: CancelInvoiceResp -> () #

NFData CancelInvoiceMsg Source # 
Instance details

Defined in Proto.InvoiceGrpc

Methods

rnf :: CancelInvoiceMsg -> () #

NFData AddHoldInvoiceResp Source # 
Instance details

Defined in Proto.InvoiceGrpc

Methods

rnf :: AddHoldInvoiceResp -> () #

NFData AddHoldInvoiceRequest Source # 
Instance details

Defined in Proto.InvoiceGrpc

Methods

rnf :: AddHoldInvoiceRequest -> () #

NFData SharedSecret 
Instance details

Defined in Crypto.ECC

Methods

rnf :: SharedSecret -> () #

NFData XImportMissionControlResponse Source # 
Instance details

Defined in Proto.RouterGrpc

NFData XImportMissionControlRequest Source # 
Instance details

Defined in Proto.RouterGrpc

NFData UpdateChanStatusResponse Source # 
Instance details

Defined in Proto.RouterGrpc

NFData UpdateChanStatusRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Methods

rnf :: UpdateChanStatusRequest -> () #

NFData TrackPaymentRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Methods

rnf :: TrackPaymentRequest -> () #

NFData SubscribeHtlcEventsRequest Source # 
Instance details

Defined in Proto.RouterGrpc

NFData SettleEvent Source # 
Instance details

Defined in Proto.RouterGrpc

Methods

rnf :: SettleEvent -> () #

NFData SetMissionControlConfigResponse Source # 
Instance details

Defined in Proto.RouterGrpc

NFData SetMissionControlConfigRequest Source # 
Instance details

Defined in Proto.RouterGrpc

NFData SendToRouteResponse Source # 
Instance details

Defined in Proto.RouterGrpc

Methods

rnf :: SendToRouteResponse -> () #

NFData SendToRouteRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Methods

rnf :: SendToRouteRequest -> () #

NFData SendPaymentRequest'DestCustomRecordsEntry Source # 
Instance details

Defined in Proto.RouterGrpc

NFData SendPaymentRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Methods

rnf :: SendPaymentRequest -> () #

NFData RouteFeeResponse Source # 
Instance details

Defined in Proto.RouterGrpc

Methods

rnf :: RouteFeeResponse -> () #

NFData RouteFeeRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Methods

rnf :: RouteFeeRequest -> () #

NFData ResolveHoldForwardAction Source # 
Instance details

Defined in Proto.RouterGrpc

NFData ResetMissionControlResponse Source # 
Instance details

Defined in Proto.RouterGrpc

NFData ResetMissionControlRequest Source # 
Instance details

Defined in Proto.RouterGrpc

NFData QueryProbabilityResponse Source # 
Instance details

Defined in Proto.RouterGrpc

NFData QueryProbabilityRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Methods

rnf :: QueryProbabilityRequest -> () #

NFData QueryMissionControlResponse Source # 
Instance details

Defined in Proto.RouterGrpc

NFData QueryMissionControlRequest Source # 
Instance details

Defined in Proto.RouterGrpc

NFData PaymentStatus Source # 
Instance details

Defined in Proto.RouterGrpc

Methods

rnf :: PaymentStatus -> () #

NFData PaymentState Source # 
Instance details

Defined in Proto.RouterGrpc

Methods

rnf :: PaymentState -> () #

NFData PairHistory Source # 
Instance details

Defined in Proto.RouterGrpc

Methods

rnf :: PairHistory -> () #

NFData PairData Source # 
Instance details

Defined in Proto.RouterGrpc

Methods

rnf :: PairData -> () #

NFData MissionControlConfig Source # 
Instance details

Defined in Proto.RouterGrpc

Methods

rnf :: MissionControlConfig -> () #

NFData LinkFailEvent Source # 
Instance details

Defined in Proto.RouterGrpc

Methods

rnf :: LinkFailEvent -> () #

NFData HtlcInfo Source # 
Instance details

Defined in Proto.RouterGrpc

Methods

rnf :: HtlcInfo -> () #

NFData HtlcEvent'EventType Source # 
Instance details

Defined in Proto.RouterGrpc

Methods

rnf :: HtlcEvent'EventType -> () #

NFData HtlcEvent'Event Source # 
Instance details

Defined in Proto.RouterGrpc

Methods

rnf :: HtlcEvent'Event -> () #

NFData HtlcEvent Source # 
Instance details

Defined in Proto.RouterGrpc

Methods

rnf :: HtlcEvent -> () #

NFData GetMissionControlConfigResponse Source # 
Instance details

Defined in Proto.RouterGrpc

NFData GetMissionControlConfigRequest Source # 
Instance details

Defined in Proto.RouterGrpc

NFData ForwardHtlcInterceptResponse Source # 
Instance details

Defined in Proto.RouterGrpc

NFData ForwardHtlcInterceptRequest'CustomRecordsEntry Source # 
Instance details

Defined in Proto.RouterGrpc

NFData ForwardHtlcInterceptRequest Source # 
Instance details

Defined in Proto.RouterGrpc

NFData ForwardFailEvent Source # 
Instance details

Defined in Proto.RouterGrpc

Methods

rnf :: ForwardFailEvent -> () #

NFData ForwardEvent Source # 
Instance details

Defined in Proto.RouterGrpc

Methods

rnf :: ForwardEvent -> () #

NFData FailureDetail Source # 
Instance details

Defined in Proto.RouterGrpc

Methods

rnf :: FailureDetail -> () #

NFData CircuitKey Source # 
Instance details

Defined in Proto.RouterGrpc

Methods

rnf :: CircuitKey -> () #

NFData ChanStatusAction Source # 
Instance details

Defined in Proto.RouterGrpc

Methods

rnf :: ChanStatusAction -> () #

NFData BuildRouteResponse Source # 
Instance details

Defined in Proto.RouterGrpc

Methods

rnf :: BuildRouteResponse -> () #

NFData BuildRouteRequest Source # 
Instance details

Defined in Proto.RouterGrpc

Methods

rnf :: BuildRouteRequest -> () #

NFData UnlockWalletResponse Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

rnf :: UnlockWalletResponse -> () #

NFData UnlockWalletRequest Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

rnf :: UnlockWalletRequest -> () #

NFData InitWalletResponse Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

rnf :: InitWalletResponse -> () #

NFData InitWalletRequest Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

rnf :: InitWalletRequest -> () #

NFData GenSeedResponse Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

rnf :: GenSeedResponse -> () #

NFData GenSeedRequest Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

rnf :: GenSeedRequest -> () #

NFData ChangePasswordResponse Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

rnf :: ChangePasswordResponse -> () #

NFData ChangePasswordRequest Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

rnf :: ChangePasswordRequest -> () #

NFData URIAuth 
Instance details

Defined in Network.URI

Methods

rnf :: URIAuth -> () #

NFData URI 
Instance details

Defined in Network.URI

Methods

rnf :: URI -> () #

NFData a => NFData [a] 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: [a] -> () #

NFData a => NFData (Maybe a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Maybe a -> () #

NFData a => NFData (Ratio a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Ratio a -> () #

NFData (Ptr a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Ptr a -> () #

NFData (FunPtr a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: FunPtr a -> () #

NFData a => NFData (Complex a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Complex a -> () #

NFData (Fixed a)

Since: deepseq-1.3.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Fixed a -> () #

NFData a => NFData (Min a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Min 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 (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 m => NFData (WrappedMonoid m)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: WrappedMonoid m -> () #

NFData a => NFData (Option a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Option a -> () #

NFData (StableName a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: StableName 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 (Identity a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Identity 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 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 (Dual a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Dual a -> () #

NFData a => NFData (Sum a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Sum 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 (Down a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Down 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 a => NFData (NonEmpty a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: NonEmpty a -> () #

NFData a => NFData (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

rnf :: IntMap a -> () #

NFData a => NFData (Tree a) 
Instance details

Defined in Data.Tree

Methods

rnf :: Tree a -> () #

NFData a => NFData (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

rnf :: Seq a -> () #

NFData a => NFData (FingerTree a) 
Instance details

Defined in Data.Sequence.Internal

Methods

rnf :: FingerTree a -> () #

NFData a => NFData (Digit a) 
Instance details

Defined in Data.Sequence.Internal

Methods

rnf :: Digit a -> () #

NFData a => NFData (Node a) 
Instance details

Defined in Data.Sequence.Internal

Methods

rnf :: Node a -> () #

NFData a => NFData (Elem a) 
Instance details

Defined in Data.Sequence.Internal

Methods

rnf :: Elem a -> () #

NFData a => NFData (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

rnf :: Set a -> () #

NFData a => NFData (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

rnf :: Doc a -> () #

NFData a => NFData (AnnotDetails a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

rnf :: AnnotDetails 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.Unboxed.Base

Methods

rnf :: Vector a -> () #

NFData (Vector a) 
Instance details

Defined in Data.Vector.Primitive

Methods

rnf :: Vector a -> () #

NFData a => NFData (Result a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

rnf :: Result a -> () #

NFData a => NFData (IResult a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

rnf :: IResult a -> () #

NFData a => NFData (HashSet a) 
Instance details

Defined in Data.HashSet.Base

Methods

rnf :: HashSet a -> () #

NFData a => NFData (DList a) 
Instance details

Defined in Data.DList

Methods

rnf :: DList a -> () #

NFData (Vector a) 
Instance details

Defined in Data.Vector.Storable

Methods

rnf :: Vector a -> () #

NFData a => NFData (Hashed a) 
Instance details

Defined in Data.Hashable.Class

Methods

rnf :: Hashed a -> () #

NFData (Image a) 
Instance details

Defined in Codec.Picture.Types

Methods

rnf :: Image a -> () #

NFData s => NFData (CI s) 
Instance details

Defined in Data.CaseInsensitive.Internal

Methods

rnf :: CI s -> () #

NFData (Digest a) 
Instance details

Defined in Crypto.Hash.Types

Methods

rnf :: Digest a -> () #

NFData (Context a) 
Instance details

Defined in Crypto.Hash.Types

Methods

rnf :: Context a -> () #

NFData (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 (Either a b) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Either a b -> () #

(NFData a, NFData b) => NFData (a, b) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a, b) -> () #

(NFData a, NFData b) => NFData (Array a b) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Array a b -> () #

(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 (Proxy a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Proxy a -> () #

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 i, NFData r) => NFData (IResult i r) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

rnf :: IResult i r -> () #

NFData (MVector s a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

rnf :: MVector s a -> () #

NFData (MVector s a) 
Instance details

Defined in Data.Vector.Primitive.Mutable

Methods

rnf :: MVector s a -> () #

(NFData k, NFData v) => NFData (HashMap k v) 
Instance details

Defined in Data.HashMap.Base

Methods

rnf :: HashMap k v -> () #

(NFData k, NFData v) => NFData (Leaf k v) 
Instance details

Defined in Data.HashMap.Base

Methods

rnf :: Leaf k v -> () #

NFData (MVector s a) 
Instance details

Defined in Data.Vector.Storable.Mutable

Methods

rnf :: MVector s a -> () #

NFData (MutableImage s a) 
Instance details

Defined in Codec.Picture.Types

Methods

rnf :: MutableImage s a -> () #

(NFData a1, NFData a2, NFData a3) => NFData (a1, a2, a3) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a1, a2, a3) -> () #

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 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 (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 a5) => NFData (a1, a2, a3, a4, a5) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a1, a2, a3, a4, a5) -> () #

(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 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
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 #

MonadTrans KatipT 
Instance details

Defined in Katip.Core

Methods

lift :: Monad m => m a -> KatipT m a #

MonadTrans KatipContextT 
Instance details

Defined in Katip.Monadic

Methods

lift :: Monad m => m a -> KatipContextT m a #

MonadTrans ResourceT 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

lift :: Monad m => m a -> ResourceT m a #

MonadTrans NoLoggingT 
Instance details

Defined in Katip.Monadic

Methods

lift :: Monad m => m a -> NoLoggingT 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 (IdentityT :: (Type -> Type) -> Type -> Type) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

lift :: Monad m => m a -> IdentityT 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 (ReaderT r) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

lift :: Monad m => m a -> ReaderT 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 #

Monoid w => MonadTrans (AccumT w) 
Instance details

Defined in Control.Monad.Trans.Accum

Methods

lift :: Monad m => m a -> AccumT w m a #

MonadTrans (SelectT r) 
Instance details

Defined in Control.Monad.Trans.Select

Methods

lift :: Monad m => m a -> SelectT r m a #

MonadTrans (ContT r) 
Instance details

Defined in Control.Monad.Trans.Cont

Methods

lift :: Monad m => m a -> ContT r 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 #

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 #

data IdentityT (f :: k -> Type) (a :: k) :: forall k. (k -> Type) -> k -> Type #

The trivial monad transformer, which maps a monad to an equivalent monad.

Instances
MonadState s m => MonadState s (IdentityT m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: IdentityT m s #

put :: s -> IdentityT m () #

state :: (s -> (a, s)) -> IdentityT 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 #

MonadError e m => MonadError e (IdentityT m) 
Instance details

Defined in Control.Monad.Error.Class

Methods

throwError :: e -> IdentityT m a #

catchError :: IdentityT m a -> (e -> IdentityT m a) -> IdentityT m a #

MonadBaseControl b m => MonadBaseControl b (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Control

Associated Types

type StM (IdentityT m) a :: Type

Methods

liftBaseWith :: (RunInBase (IdentityT m) b -> b a) -> IdentityT m a

restoreM :: StM (IdentityT m) a -> IdentityT 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 #

MonadTransControl (IdentityT :: (Type -> Type) -> Type -> Type) 
Instance details

Defined in Control.Monad.Trans.Control

Associated Types

type StT IdentityT a :: Type

Methods

liftWith :: Monad m => (Run IdentityT -> m a) -> IdentityT m a

restoreT :: Monad m => m (StT IdentityT a) -> IdentityT 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 #

fail :: String -> IdentityT 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 #

MonadFix m => MonadFix (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

mfix :: (a -> IdentityT m a) -> IdentityT m a #

MonadFail m => MonadFail (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

fail :: String -> IdentityT 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 #

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 #

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 #

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) #

Contravariant f => Contravariant (IdentityT f) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

contramap :: (a -> b) -> IdentityT f b -> IdentityT f a #

(>$) :: b -> IdentityT f b -> IdentityT f a #

Eq1 f => Eq1 (IdentityT f) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

liftEq :: (a -> b -> Bool) -> IdentityT f a -> IdentityT f b -> Bool #

Ord1 f => Ord1 (IdentityT f) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

liftCompare :: (a -> b -> Ordering) -> IdentityT f a -> IdentityT f b -> Ordering #

Read1 f => Read1 (IdentityT f) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (IdentityT f a) #

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [IdentityT f a] #

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (IdentityT f a) #

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [IdentityT f a] #

Show1 f => Show1 (IdentityT f) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> IdentityT f a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [IdentityT f a] -> ShowS #

MonadZip m => MonadZip (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

mzip :: IdentityT m a -> IdentityT m b -> IdentityT m (a, b) #

mzipWith :: (a -> b -> c) -> IdentityT m a -> IdentityT m b -> IdentityT m c #

munzip :: IdentityT m (a, b) -> (IdentityT m a, IdentityT m b) #

MonadIO m => MonadIO (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

liftIO :: IO a -> IdentityT 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] #

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 #

PrimMonad m => PrimMonad (IdentityT m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (IdentityT m) :: Type

Methods

primitive :: (State# (PrimState (IdentityT m)) -> (#State# (PrimState (IdentityT m)), a#)) -> IdentityT m a

(KatipContext m, Katip (IdentityT m)) => KatipContext (IdentityT m) 
Instance details

Defined in Katip.Monadic

MonadCatch m => MonadCatch (IdentityT m) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => IdentityT m a -> (e -> IdentityT m a) -> IdentityT m a

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) #

MonadThrow m => MonadThrow (IdentityT m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> IdentityT m a

MonadUnliftIO m => MonadUnliftIO (IdentityT m) 
Instance details

Defined in Control.Monad.IO.Unlift

Methods

askUnliftIO :: IdentityT m (UnliftIO (IdentityT m)) #

withRunInIO :: ((forall a. IdentityT m a -> IO a) -> IO b) -> IdentityT m b #

MonadResource m => MonadResource (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

liftResourceT :: ResourceT IO a -> IdentityT m a

PrimBase m => PrimBase (IdentityT m) 
Instance details

Defined in Control.Monad.Primitive

Methods

internal :: IdentityT m a -> State# (PrimState (IdentityT m)) -> (#State# (PrimState (IdentityT m)), a#)

MonadLogger m => MonadLogger (IdentityT m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> IdentityT m ()

MonadLoggerIO m => MonadLoggerIO (IdentityT m) 
Instance details

Defined in Control.Monad.Logger

Methods

askLoggerIO :: IdentityT m (Loc -> LogSource -> LogLevel -> LogStr -> IO ())

Magnify m n b a => Magnify (IdentityT m) (IdentityT n) b a 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

magnify :: LensLike' (Magnified (IdentityT m) c) a b -> IdentityT m c -> IdentityT n c

Zoom m n s t => Zoom (IdentityT m) (IdentityT n) s t 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

zoom :: LensLike' (Zoomed (IdentityT m) c) t s -> IdentityT m c -> IdentityT n c

(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 #

(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 #

(Read1 f, Read a) => Read (IdentityT f a) 
Instance details

Defined in Control.Monad.Trans.Identity

(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 #

type StT (IdentityT :: (Type -> Type) -> Type -> Type) a 
Instance details

Defined in Control.Monad.Trans.Control

type StT (IdentityT :: (Type -> Type) -> Type -> Type) a = a
type PrimState (IdentityT m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (IdentityT m) = PrimState m
type Magnified (IdentityT m) 
Instance details

Defined in Lens.Micro.Mtl.Internal

type Magnified (IdentityT m) = Magnified m
type Zoomed (IdentityT m) 
Instance details

Defined in Lens.Micro.Mtl.Internal

type Zoomed (IdentityT m) = Zoomed m
type StM (IdentityT m) a 
Instance details

Defined in Control.Monad.Trans.Control

type StM (IdentityT m) a = ComposeSt (IdentityT :: (Type -> Type) -> Type -> Type) m a

gets :: MonadState s m => (s -> a) -> m a #

Gets specific component of the state, using a projection function supplied.

modify' :: MonadState s m => (s -> s) -> m () #

A variant of modify in which the computation is strict in the new state.

Since: mtl-2.2

modify :: MonadState s m => (s -> s) -> m () #

Monadic state transformer.

Maps an old state to a new state inside a state monad. The old state is thrown away.

     Main> :t modify ((+1) :: Int -> Int)
     modify (...) :: (MonadState Int a) => a ()

This says that modify (+1) acts over any Monad that is a member of the MonadState class, with an Int state.

class Monad m => MonadState s (m :: Type -> Type) | m -> s where #

Minimal definition is either both of get and put or just state

Minimal complete definition

state | get, put

Methods

get :: m s #

Return the state from the internals of the monad.

put :: s -> m () #

Replace the state inside the monad.

state :: (s -> (a, s)) -> m a #

Embed a simple state action into the monad.

Instances
MonadState s m => MonadState s (MaybeT m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: MaybeT m s #

put :: s -> MaybeT m () #

state :: (s -> (a, s)) -> MaybeT m a #

MonadState s m => MonadState s (ListT m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: ListT m s #

put :: s -> ListT m () #

state :: (s -> (a, s)) -> ListT m a #

MonadState s m => MonadState s (NoLoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

get :: NoLoggingT m s #

put :: s -> NoLoggingT m () #

state :: (s -> (a, s)) -> NoLoggingT 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 #

MonadState s m => MonadState s (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

get :: ResourceT m s #

put :: s -> ResourceT m () #

state :: (s -> (a, s)) -> ResourceT m a #

MonadState s m => MonadState s (NoLoggingT m) 
Instance details

Defined in Katip.Monadic

Methods

get :: NoLoggingT m s #

put :: s -> NoLoggingT m () #

state :: (s -> (a, s)) -> NoLoggingT m a #

MonadState s m => MonadState s (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

get :: KatipContextT m s #

put :: s -> KatipContextT m () #

state :: (s -> (a, s)) -> KatipContextT m a #

(Monoid w, MonadState s m) => MonadState s (WriterT w m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: WriterT w m s #

put :: s -> WriterT w m () #

state :: (s -> (a, s)) -> WriterT w m a #

(Monoid w, MonadState s m) => MonadState s (WriterT w m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: WriterT w m s #

put :: s -> WriterT w m () #

state :: (s -> (a, s)) -> WriterT w m a #

Monad m => MonadState s (StateT s m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: StateT s m s #

put :: s -> StateT s m () #

state :: (s -> (a, s)) -> StateT s m a #

Monad m => MonadState s (StateT s m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: StateT s m s #

put :: s -> StateT s m () #

state :: (s -> (a, s)) -> StateT s m a #

MonadState s m => MonadState s (ReaderT r m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: ReaderT r m s #

put :: s -> ReaderT r m () #

state :: (s -> (a, s)) -> ReaderT r m a #

MonadState s m => MonadState s (IdentityT m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: IdentityT m s #

put :: s -> IdentityT m () #

state :: (s -> (a, s)) -> IdentityT m a #

MonadState s m => MonadState s (ExceptT e m)

Since: mtl-2.2

Instance details

Defined in Control.Monad.State.Class

Methods

get :: ExceptT e m s #

put :: s -> ExceptT e m () #

state :: (s -> (a, s)) -> ExceptT e m a #

(Error e, MonadState s m) => MonadState s (ErrorT e m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: ErrorT e m s #

put :: s -> ErrorT e m () #

state :: (s -> (a, s)) -> ErrorT e m a #

MonadState s m => MonadState s (ContT r m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: ContT r m s #

put :: s -> ContT r m () #

state :: (s -> (a, s)) -> ContT r m a #

MonadState s m => MonadState s (ConduitT i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

get :: ConduitT i o m s #

put :: s -> ConduitT i o m () #

state :: (s -> (a, s)) -> ConduitT i o m a #

(Monad m, Monoid w) => MonadState s (RWST r w s m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: RWST r w s m s #

put :: s -> RWST r w s m () #

state :: (s -> (a, s)) -> RWST r w s m a #

(Monad m, Monoid w) => MonadState s (RWST r w s m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: RWST r w s m s #

put :: s -> RWST r w s m () #

state :: (s -> (a, s)) -> RWST r w s m a #

MonadState s m => MonadState s (Pipe l i o u m) 
Instance details

Defined in Data.Conduit.Internal.Pipe

Methods

get :: Pipe l i o u m s #

put :: s -> Pipe l i o u m () #

state :: (s -> (a, s)) -> Pipe l i o u m a #

asks #

Arguments

:: MonadReader r m 
=> (r -> a)

The selector function to apply to the environment.

-> m a 

Retrieves a function of the current environment.

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.

reader #

Arguments

:: (r -> a)

The selector function to apply to the environment.

-> m a 

Retrieves a function of the current environment.

Instances
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 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 (NoLoggingT m) 
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 (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 (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 (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

ask :: KatipContextT m r #

local :: (r -> r) -> KatipContextT m a -> KatipContextT m a #

reader :: (r -> a) -> KatipContextT m a #

MonadReader r m => MonadReader r (NoLoggingT m) 
Instance details

Defined in Katip.Monadic

Methods

ask :: NoLoggingT m r #

local :: (r -> r) -> NoLoggingT m a -> NoLoggingT m a #

reader :: (r -> a) -> NoLoggingT 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 (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 #

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 (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 #

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 #

(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 ((->) r :: Type -> Type) 
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 #

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 #

(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 #

newtype ExceptT e (m :: Type -> Type) a #

A monad transformer that adds exceptions to other monads.

ExceptT constructs a monad parameterized over two things:

  • e - The exception type.
  • m - The inner monad.

The return function yields a computation that produces the given value, while >>= sequences two subcomputations, exiting on the first exception.

Constructors

ExceptT (m (Either e a)) 
Instances
MonadState s m => MonadState s (ExceptT e m)

Since: mtl-2.2

Instance details

Defined in Control.Monad.State.Class

Methods

get :: ExceptT e m s #

put :: s -> ExceptT e m () #

state :: (s -> (a, s)) -> ExceptT 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 #

Monad m => MonadError e (ExceptT e m)

Since: mtl-2.2

Instance details

Defined in Control.Monad.Error.Class

Methods

throwError :: e -> ExceptT e m a #

catchError :: ExceptT e m a -> (e -> ExceptT e m a) -> ExceptT e m a #

MonadBaseControl b m => MonadBaseControl b (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Control

Associated Types

type StM (ExceptT e m) a :: Type

Methods

liftBaseWith :: (RunInBase (ExceptT e m) b -> b a) -> ExceptT e m a

restoreM :: StM (ExceptT e m) a -> ExceptT e m a

MonadTrans (ExceptT e) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

lift :: Monad m => m a -> ExceptT e m a #

MonadTransControl (ExceptT e) 
Instance details

Defined in Control.Monad.Trans.Control

Associated Types

type StT (ExceptT e) a :: Type

Methods

liftWith :: Monad m => (Run (ExceptT e) -> m a) -> ExceptT e m a

restoreT :: Monad m => m (StT (ExceptT e) a) -> ExceptT 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 #

fail :: String -> ExceptT 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 #

MonadFix m => MonadFix (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

mfix :: (a -> ExceptT e m a) -> ExceptT e m a #

MonadFail m => MonadFail (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

fail :: String -> ExceptT 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 #

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 #

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 #

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) #

Contravariant m => Contravariant (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

contramap :: (a -> b) -> ExceptT e m b -> ExceptT e m a #

(>$) :: b -> ExceptT e m b -> ExceptT e m a #

(Eq e, Eq1 m) => Eq1 (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

liftEq :: (a -> b -> Bool) -> ExceptT e m a -> ExceptT e m b -> Bool #

(Ord e, Ord1 m) => Ord1 (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

liftCompare :: (a -> b -> Ordering) -> ExceptT e m a -> ExceptT e m b -> Ordering #

(Read e, Read1 m) => Read1 (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (ExceptT e m a) #

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [ExceptT e m a] #

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (ExceptT e m a) #

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [ExceptT e m a] #

(Show e, Show1 m) => Show1 (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> ExceptT e m a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [ExceptT e m a] -> ShowS #

MonadZip m => MonadZip (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

mzip :: ExceptT e m a -> ExceptT e m b -> ExceptT e m (a, b) #

mzipWith :: (a -> b -> c) -> ExceptT e m a -> ExceptT e m b -> ExceptT e m c #

munzip :: ExceptT e m (a, b) -> (ExceptT e m a, ExceptT e m b) #

MonadIO m => MonadIO (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

liftIO :: IO a -> ExceptT 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] #

(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 #

PrimMonad m => PrimMonad (ExceptT e m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (ExceptT e m) :: Type

Methods

primitive :: (State# (PrimState (ExceptT e m)) -> (#State# (PrimState (ExceptT e m)), a#)) -> ExceptT e m a

Katip m => Katip (ExceptT s m) 
Instance details

Defined in Katip.Core

Methods

getLogEnv :: ExceptT s m LogEnv #

localLogEnv :: (LogEnv -> LogEnv) -> ExceptT s m a -> ExceptT s m a #

(KatipContext m, Katip (ExceptT e m)) => KatipContext (ExceptT e m) 
Instance details

Defined in Katip.Monadic

MonadCatch m => MonadCatch (ExceptT e m) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e0 => ExceptT e m a -> (e0 -> ExceptT e m a) -> ExceptT e m a

MonadMask m => MonadMask (ExceptT e m) 
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) #

MonadThrow m => MonadThrow (ExceptT e m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e0 => e0 -> ExceptT e m a

MonadResource m => MonadResource (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

liftResourceT :: ResourceT IO a -> ExceptT e m a

MonadLogger m => MonadLogger (ExceptT e m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> ExceptT e m ()

MonadLoggerIO m => MonadLoggerIO (ExceptT e m) 
Instance details

Defined in Control.Monad.Logger

Methods

askLoggerIO :: ExceptT e m (Loc -> LogSource -> LogLevel -> LogStr -> IO ())

Zoom m n s t => Zoom (ExceptT e m) (ExceptT e n) s t 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

zoom :: LensLike' (Zoomed (ExceptT e m) c) t s -> ExceptT e m c -> ExceptT e n c

(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 #

(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 #

(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] #

(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 #

type StT (ExceptT e) a 
Instance details

Defined in Control.Monad.Trans.Control

type StT (ExceptT e) a = Either e a
type PrimState (ExceptT e m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ExceptT e m) = PrimState m
type Zoomed (ExceptT e m) 
Instance details

Defined in Lens.Micro.Mtl.Internal

type Zoomed (ExceptT e m) = FocusingErr e (Zoomed m)
type StM (ExceptT e m) a 
Instance details

Defined in Control.Monad.Trans.Control

type StM (ExceptT e m) a = ComposeSt (ExceptT e) m a

runExceptT :: ExceptT e m a -> m (Either e a) #

The inverse of ExceptT.

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
MonadState s m => MonadState s (ReaderT r m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: ReaderT r m s #

put :: s -> ReaderT r m () #

state :: (s -> (a, s)) -> ReaderT r m a #

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 #

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 #

MonadBaseControl b m => MonadBaseControl b (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Control

Associated Types

type StM (ReaderT r m) a :: Type

Methods

liftBaseWith :: (RunInBase (ReaderT r m) b -> b a) -> ReaderT r m a

restoreM :: StM (ReaderT r m) 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 #

MonadTransControl (ReaderT r) 
Instance details

Defined in Control.Monad.Trans.Control

Associated Types

type StT (ReaderT r) a :: Type

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

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 #

fail :: String -> 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 #

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 #

MonadFail m => MonadFail (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

fail :: String -> 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 #

Contravariant m => Contravariant (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

contramap :: (a -> b) -> ReaderT r m b -> ReaderT r m a #

(>$) :: b -> ReaderT r m b -> 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) #

MonadIO m => MonadIO (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

liftIO :: IO a -> 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] #

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 #

PrimMonad m => PrimMonad (ReaderT r m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (ReaderT r m) :: Type

Methods

primitive :: (State# (PrimState (ReaderT r m)) -> (#State# (PrimState (ReaderT r m)), a#)) -> ReaderT r m a

Katip m => Katip (ReaderT s m) 
Instance details

Defined in Katip.Core

Methods

getLogEnv :: ReaderT s m LogEnv #

localLogEnv :: (LogEnv -> LogEnv) -> ReaderT s m a -> ReaderT s m a #

(KatipContext m, Katip (ReaderT r m)) => KatipContext (ReaderT r m) 
Instance details

Defined in Katip.Monadic

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

MonadUnliftIO m => MonadUnliftIO (ReaderT r m) 
Instance details

Defined in Control.Monad.IO.Unlift

Methods

askUnliftIO :: ReaderT r m (UnliftIO (ReaderT r m)) #

withRunInIO :: ((forall a. ReaderT r m a -> IO a) -> IO b) -> ReaderT r m b #

MonadResource m => MonadResource (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

liftResourceT :: ResourceT IO a -> 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 ())

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

type StT (ReaderT r) a 
Instance details

Defined in Control.Monad.Trans.Control

type StT (ReaderT r) a = a
type PrimState (ReaderT r m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ReaderT r m) = PrimState 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 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 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.

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.)

newtype StateT s (m :: Type -> Type) a #

A state transformer monad parameterized by:

  • s - The state.
  • m - The inner monad.

The return function leaves the state unchanged, while >>= uses the final state of the first computation as the initial state of the second.

Constructors

StateT 

Fields

Instances
Monad m => MonadState s (StateT s m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: StateT s m s #

put :: s -> StateT s m () #

state :: (s -> (a, s)) -> 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 #

MonadError e m => MonadError e (StateT s m) 
Instance details

Defined in Control.Monad.Error.Class

Methods

throwError :: e -> StateT s m a #

catchError :: StateT s m a -> (e -> StateT s m a) -> StateT s m a #

MonadBaseControl b m => MonadBaseControl b (StateT s m) 
Instance details

Defined in Control.Monad.Trans.Control

Associated Types

type StM (StateT s m) a :: Type

Methods

liftBaseWith :: (RunInBase (StateT s m) b -> b a) -> StateT s m a

restoreM :: StM (StateT s 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 #

MonadTransControl (StateT s) 
Instance details

Defined in Control.Monad.Trans.Control

Associated Types

type StT (StateT s) a :: Type

Methods

liftWith :: Monad m => (Run (StateT s) -> m a) -> StateT s m a

restoreT :: Monad m => m (StT (StateT s) 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 #

fail :: String -> 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 #

MonadFix m => MonadFix (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

mfix :: (a -> StateT s m a) -> 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 #

(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 #

Contravariant m => Contravariant (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

contramap :: (a -> b) -> StateT s m b -> StateT s m a #

(>$) :: b -> StateT s m b -> 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 #

(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] #

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 #

PrimMonad m => PrimMonad (StateT s m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (StateT s m) :: Type

Methods

primitive :: (State# (PrimState (StateT s m)) -> (#State# (PrimState (StateT s m)), a#)) -> StateT s m a

Katip m => Katip (StateT s m) 
Instance details

Defined in Katip.Core

Methods

getLogEnv :: StateT s m LogEnv #

localLogEnv :: (LogEnv -> LogEnv) -> StateT s m a -> StateT s m a #

(KatipContext m, Katip (StateT s m)) => KatipContext (StateT s m) 
Instance details

Defined in Katip.Monadic

MonadCatch m => MonadCatch (StateT s m) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => StateT s m a -> (e -> StateT s m a) -> StateT s m a

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) #

MonadThrow m => MonadThrow (StateT s m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> StateT s m a

MonadResource m => MonadResource (StateT s m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

liftResourceT :: ResourceT IO a -> StateT s m a

MonadLogger m => MonadLogger (StateT s m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> StateT s m ()

MonadLoggerIO m => MonadLoggerIO (StateT s m) 
Instance details

Defined in Control.Monad.Logger

Methods

askLoggerIO :: StateT s m (Loc -> LogSource -> LogLevel -> LogStr -> IO ())

Monad z => Zoom (StateT s z) (StateT t z) s t 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

zoom :: LensLike' (Zoomed (StateT s z) c) t s -> StateT s z c -> StateT t z c

type StT (StateT s) a 
Instance details

Defined in Control.Monad.Trans.Control

type StT (StateT s) a = (a, s)
type PrimState (StateT s m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (StateT s m) = PrimState m
type Zoomed (StateT s z) 
Instance details

Defined in Lens.Micro.Mtl.Internal

type Zoomed (StateT s z) = Focusing z
type StM (StateT s m) a 
Instance details

Defined in Control.Monad.Trans.Control

type StM (StateT s m) a = ComposeSt (StateT s) m a

type State s = StateT s Identity #

A state monad parameterized by the type s of the state to carry.

The return function leaves the state unchanged, while >>= uses the final state of the first computation as the initial state of the second.

runState #

Arguments

:: State s a

state-passing computation to execute

-> s

initial state

-> (a, s)

return value and final state

Unwrap a state monad computation as a function. (The inverse of state.)

evalState #

Arguments

:: State s a

state-passing computation to execute

-> s

initial value

-> a

return value of the state computation

Evaluate a state computation with the given initial state and return the final value, discarding the final state.

execState #

Arguments

:: State s a

state-passing computation to execute

-> s

initial value

-> s

final state

Evaluate a state computation with the given initial state and return the final state, discarding the final value.

withState :: (s -> s) -> State s a -> State s a #

withState f m executes action m on a state modified by applying f.

evalStateT :: Monad m => StateT s m a -> s -> m a #

Evaluate a state computation with the given initial state and return the final value, discarding the final state.

execStateT :: Monad m => StateT s m a -> s -> m s #

Evaluate a state computation with the given initial state and return the final state, discarding the final value.

check :: Bool -> STM () #

Check that the boolean condition is true and, if not, retry.

In other words, check b = unless b retry.

Since: stm-2.1.1

modifyTVar' :: TVar a -> (a -> a) -> STM () #

Strict version of modifyTVar.

Since: stm-2.3

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.

readTChan :: TChan a -> STM a #

Read the next value from the TChan.

writeTChan :: TChan a -> a -> STM () #

Write a value to a TChan.

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

data TChan a #

TChan is an abstract type representing an unbounded FIFO channel.

Instances
Eq (TChan a) 
Instance details

Defined in Control.Concurrent.STM.TChan

Methods

(==) :: TChan a -> TChan a -> Bool #

(/=) :: TChan a -> TChan a -> Bool #

fromStrict :: Text -> Text #

O(c) Convert a strict Text into a lazy Text.

toStrict :: Text -> Text #

O(n) Convert a lazy Text into a strict Text.

unwords :: [Text] -> Text #

O(n) Joins words using single space characters.

unlines :: [Text] -> Text #

O(n) Joins lines, after appending a terminating newline to each.

lines :: Text -> [Text] #

O(n) Breaks a Text up into a list of Texts at newline Chars. The resulting strings do not contain newlines.

words :: Text -> [Text] #

O(n) Breaks a Text up into a list of words, delimited by Chars representing white space.

pack :: String -> Text #

O(n) Convert a String into a Text. Subject to fusion. Performs replacement on invalid scalar values.

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.

unpack :: Text -> String #

O(n) Convert a Text into a String. Subject to fusion.

data Text #

A space efficient, packed, unboxed Unicode text type.

Instances
FromJSON Text 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Text #

parseJSONList :: Value -> Parser [Text] #

FromJSONKey Text 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction Text

fromJSONKeyList :: FromJSONKeyFunction [Text]

Hashable Text 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Text -> Int #

hash :: Text -> Int

ToJSON Text 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Text -> Value

toEncoding :: Text -> Encoding

toJSONList :: [Text] -> Value

toEncodingList :: [Text] -> Encoding

ToJSONKey Text 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction Text

toJSONKeyList :: ToJSONKeyFunction [Text]

KeyValue Object 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

(.=) :: ToJSON v => Text -> v -> Object

KeyValue Pair 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

(.=) :: ToJSON v => Text -> v -> Pair

PersistField Text 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Text -> PersistValue

fromPersistValue :: PersistValue -> Either Text Text

PersistFieldSql Text 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Text -> SqlType

ToObject Object 
Instance details

Defined in Katip.Core

Methods

toObject :: Object -> Object

Container Text 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element Text :: Type #

Methods

toList :: Text -> [Element Text] #

null :: Text -> Bool #

foldr :: (Element Text -> b -> b) -> b -> Text -> b #

foldl :: (b -> Element Text -> b) -> b -> Text -> b #

foldl' :: (b -> Element Text -> b) -> b -> Text -> b #

length :: Text -> Int #

elem :: Element Text -> Text -> Bool #

maximum :: Text -> Element Text #

minimum :: Text -> Element Text #

foldMap :: Monoid m => (Element Text -> m) -> Text -> m #

fold :: Text -> Element Text #

foldr' :: (Element Text -> b -> b) -> b -> Text -> b #

foldr1 :: (Element Text -> Element Text -> Element Text) -> Text -> Element Text #

foldl1 :: (Element Text -> Element Text -> Element Text) -> Text -> Element Text #

notElem :: Element Text -> Text -> Bool #

all :: (Element Text -> Bool) -> Text -> Bool #

any :: (Element Text -> Bool) -> Text -> Bool #

and :: Text -> Bool #

or :: Text -> Bool #

find :: (Element Text -> Bool) -> Text -> Maybe (Element Text) #

safeHead :: Text -> Maybe (Element Text) #

One Text 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem Text :: Type #

Methods

one :: OneItem Text -> Text #

Print Text 
Instance details

Defined in Universum.Print.Internal

Methods

hPutStr :: Handle -> Text -> IO ()

hPutStrLn :: Handle -> Text -> IO ()

ToLText Text 
Instance details

Defined in Universum.String.Conversion

Methods

toLText :: Text -> Text0 #

ToString Text 
Instance details

Defined in Universum.String.Conversion

Methods

toString :: Text -> String #

ToText Text 
Instance details

Defined in Universum.String.Conversion

Methods

toText :: Text -> Text #

Chunk Text 
Instance details

Defined in Data.Attoparsec.Internal.Types

Associated Types

type ChunkElem Text :: Type

Methods

nullChunk :: Text -> Bool

pappendChunk :: State Text -> Text -> State Text

atBufferEnd :: Text -> State Text -> Pos

bufferElemAt :: Text -> Pos -> State Text -> Maybe (ChunkElem Text, Int)

chunkElemToChar :: Text -> ChunkElem Text -> Char

FieldDefault Text 
Instance details

Defined in Data.ProtoLens.Message

Methods

fieldDefault :: Text

ToNumeric Text 
Instance details

Defined in Codec.QRCode.Data.ToInput

Methods

toNumeric :: Text -> [Int]

ToText Text 
Instance details

Defined in Codec.QRCode.Data.ToInput

Methods

toString :: Text -> [Char]

isCI :: Text -> Bool

FoldCase Text 
Instance details

Defined in Data.CaseInsensitive.Internal

Methods

foldCase :: Text -> Text

foldCaseList :: [Text] -> [Text]

ConvertUtf8 Text ByteString 
Instance details

Defined in Universum.String.Conversion

ConvertUtf8 Text ByteString 
Instance details

Defined in Universum.String.Conversion

StringConv String Text 
Instance details

Defined in Data.String.Conv

Methods

strConv :: Leniency -> String -> Text

StringConv ByteString Text 
Instance details

Defined in Data.String.Conv

Methods

strConv :: Leniency -> ByteString -> Text

StringConv ByteString Text 
Instance details

Defined in Data.String.Conv

Methods

strConv :: Leniency -> ByteString -> Text

StringConv Text Text 
Instance details

Defined in Data.String.Conv

Methods

strConv :: Leniency -> Text0 -> Text

StringConv Text String 
Instance details

Defined in Data.String.Conv

Methods

strConv :: Leniency -> Text -> String

StringConv Text ByteString 
Instance details

Defined in Data.String.Conv

Methods

strConv :: Leniency -> Text -> ByteString

StringConv Text ByteString 
Instance details

Defined in Data.String.Conv

Methods

strConv :: Leniency -> Text -> ByteString

StringConv Text Text 
Instance details

Defined in Data.String.Conv

Methods

strConv :: Leniency -> Text -> Text0

StringConv Text Text 
Instance details

Defined in Data.String.Conv

Methods

strConv :: Leniency -> Text -> Text

FromGrpc RPreimage Text Source # 
Instance details

Defined in LndClient.Data.Newtype

FromGrpc RHash Text Source # 
Instance details

Defined in LndClient.Data.Newtype

FromGrpc PaymentRequest Text Source # 
Instance details

Defined in LndClient.Data.Newtype

FromGrpc NodeLocation Text Source # 
Instance details

Defined in LndClient.Data.Newtype

FromGrpc NodePubKey Text Source # 
Instance details

Defined in LndClient.Data.Newtype

ToGrpc PaymentRequest Text Source # 
Instance details

Defined in LndClient.Data.Newtype

ToGrpc NodeLocation Text Source # 
Instance details

Defined in LndClient.Data.Newtype

ToGrpc NodePubKey Text Source # 
Instance details

Defined in LndClient.Data.Newtype

HasField WalletBalanceResponse'AccountBalanceEntry "key" Text 
Instance details

Defined in Proto.LndGrpc

HasField VerifyMessageResponse "pubkey" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "pubkey" -> (Text -> f Text) -> VerifyMessageResponse -> f VerifyMessageResponse

HasField VerifyMessageRequest "signature" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "signature" -> (Text -> f Text) -> VerifyMessageRequest -> f VerifyMessageRequest

HasField Utxo "address" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "address" -> (Text -> f Text) -> Utxo -> f Utxo

HasField Utxo "pkScript" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "pkScript" -> (Text -> f Text) -> Utxo -> f Utxo

HasField Transaction "blockHash" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "blockHash" -> (Text -> f Text) -> Transaction -> f Transaction

HasField Transaction "label" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "label" -> (Text -> f Text) -> Transaction -> f Transaction

HasField Transaction "rawTxHex" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "rawTxHex" -> (Text -> f Text) -> Transaction -> f Transaction

HasField Transaction "txHash" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "txHash" -> (Text -> f Text) -> Transaction -> f Transaction

HasField TimestampedError "error" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "error" -> (Text -> f Text) -> TimestampedError -> f TimestampedError

HasField SignMessageResponse "signature" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "signature" -> (Text -> f Text) -> SignMessageResponse -> f SignMessageResponse

HasField SendToRouteRequest "paymentHashString" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "paymentHashString" -> (Text -> f Text) -> SendToRouteRequest -> f SendToRouteRequest

HasField SendResponse "paymentError" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "paymentError" -> (Text -> f Text) -> SendResponse -> f SendResponse

HasField SendRequest "destString" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "destString" -> (Text -> f Text) -> SendRequest -> f SendRequest

HasField SendRequest "paymentHashString" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "paymentHashString" -> (Text -> f Text) -> SendRequest -> f SendRequest

HasField SendRequest "paymentRequest" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "paymentRequest" -> (Text -> f Text) -> SendRequest -> f SendRequest

HasField SendManyResponse "txid" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "txid" -> (Text -> f Text) -> SendManyResponse -> f SendManyResponse

HasField SendManyRequest'AddrToAmountEntry "key" Text 
Instance details

Defined in Proto.LndGrpc

HasField SendManyRequest "label" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "label" -> (Text -> f Text) -> SendManyRequest -> f SendManyRequest

HasField SendCoinsResponse "txid" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "txid" -> (Text -> f Text) -> SendCoinsResponse -> f SendCoinsResponse

HasField SendCoinsRequest "addr" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "addr" -> (Text -> f Text) -> SendCoinsRequest -> f SendCoinsRequest

HasField SendCoinsRequest "label" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "label" -> (Text -> f Text) -> SendCoinsRequest -> f SendCoinsRequest

HasField Resolution "sweepTxid" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "sweepTxid" -> (Text -> f Text) -> Resolution -> f Resolution

HasField ReadyForPsbtFunding "fundingAddress" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "fundingAddress" -> (Text -> f Text) -> ReadyForPsbtFunding -> f ReadyForPsbtFunding

HasField QueryRoutesRequest "pubKey" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "pubKey" -> (Text -> f Text) -> QueryRoutesRequest -> f QueryRoutesRequest

HasField QueryRoutesRequest "sourcePubKey" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "sourcePubKey" -> (Text -> f Text) -> QueryRoutesRequest -> f QueryRoutesRequest

HasField PendingHTLC "outpoint" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "outpoint" -> (Text -> f Text) -> PendingHTLC -> f PendingHTLC

HasField PendingChannelsResponse'PendingChannel "channelPoint" Text 
Instance details

Defined in Proto.LndGrpc

HasField PendingChannelsResponse'PendingChannel "remoteNodePub" Text 
Instance details

Defined in Proto.LndGrpc

HasField PendingChannelsResponse'ForceClosedChannel "closingTxid" Text 
Instance details

Defined in Proto.LndGrpc

HasField PendingChannelsResponse'Commitments "localTxid" Text 
Instance details

Defined in Proto.LndGrpc

HasField PendingChannelsResponse'Commitments "remotePendingTxid" Text 
Instance details

Defined in Proto.LndGrpc

HasField PendingChannelsResponse'Commitments "remoteTxid" Text 
Instance details

Defined in Proto.LndGrpc

HasField PendingChannelsResponse'ClosedChannel "closingTxid" Text 
Instance details

Defined in Proto.LndGrpc

HasField PeerEvent "pubKey" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "pubKey" -> (Text -> f Text) -> PeerEvent -> f PeerEvent

HasField Peer "address" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "address" -> (Text -> f Text) -> Peer -> f Peer

HasField Peer "pubKey" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "pubKey" -> (Text -> f Text) -> Peer -> f Peer

HasField PaymentHash "rHashStr" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "rHashStr" -> (Text -> f Text) -> PaymentHash -> f PaymentHash

HasField Payment "paymentHash" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "paymentHash" -> (Text -> f Text) -> Payment -> f Payment

HasField Payment "paymentPreimage" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "paymentPreimage" -> (Text -> f Text) -> Payment -> f Payment

HasField Payment "paymentRequest" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "paymentRequest" -> (Text -> f Text) -> Payment -> f Payment

HasField PayReqString "payReq" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "payReq" -> (Text -> f Text) -> PayReqString -> f PayReqString

HasField PayReq "description" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "description" -> (Text -> f Text) -> PayReq -> f PayReq

HasField PayReq "descriptionHash" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "descriptionHash" -> (Text -> f Text) -> PayReq -> f PayReq

HasField PayReq "destination" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "destination" -> (Text -> f Text) -> PayReq -> f PayReq

HasField PayReq "fallbackAddr" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "fallbackAddr" -> (Text -> f Text) -> PayReq -> f PayReq

HasField PayReq "paymentHash" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "paymentHash" -> (Text -> f Text) -> PayReq -> f PayReq

HasField OutPoint "txidStr" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "txidStr" -> (Text -> f Text) -> OutPoint -> f OutPoint

HasField OpenChannelRequest "closeAddress" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "closeAddress" -> (Text -> f Text) -> OpenChannelRequest -> f OpenChannelRequest

HasField OpenChannelRequest "nodePubkeyString" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "nodePubkeyString" -> (Text -> f Text) -> OpenChannelRequest -> f OpenChannelRequest

HasField Op "entity" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "entity" -> (Text -> f Text) -> Op -> f Op

HasField NodeUpdate "alias" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "alias" -> (Text -> f Text) -> NodeUpdate -> f NodeUpdate

HasField NodeUpdate "color" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "color" -> (Text -> f Text) -> NodeUpdate -> f NodeUpdate

HasField NodeUpdate "identityKey" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "identityKey" -> (Text -> f Text) -> NodeUpdate -> f NodeUpdate

HasField NodeMetricsResponse'BetweennessCentralityEntry "key" Text 
Instance details

Defined in Proto.LndGrpc

HasField NodeInfoRequest "pubKey" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "pubKey" -> (Text -> f Text) -> NodeInfoRequest -> f NodeInfoRequest

HasField NodeAddress "addr" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "addr" -> (Text -> f Text) -> NodeAddress -> f NodeAddress

HasField NodeAddress "network" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "network" -> (Text -> f Text) -> NodeAddress -> f NodeAddress

HasField NewAddressResponse "address" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "address" -> (Text -> f Text) -> NewAddressResponse -> f NewAddressResponse

HasField NewAddressRequest "account" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "account" -> (Text -> f Text) -> NewAddressRequest -> f NewAddressRequest

HasField MacaroonPermission "action" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "action" -> (Text -> f Text) -> MacaroonPermission -> f MacaroonPermission

HasField MacaroonPermission "entity" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "entity" -> (Text -> f Text) -> MacaroonPermission -> f MacaroonPermission

HasField ListUnspentRequest "account" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "account" -> (Text -> f Text) -> ListUnspentRequest -> f ListUnspentRequest

HasField ListPermissionsResponse'MethodPermissionsEntry "key" Text 
Instance details

Defined in Proto.LndGrpc

HasField LightningNode "alias" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "alias" -> (Text -> f Text) -> LightningNode -> f LightningNode

HasField LightningNode "color" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "color" -> (Text -> f Text) -> LightningNode -> f LightningNode

HasField LightningNode "pubKey" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "pubKey" -> (Text -> f Text) -> LightningNode -> f LightningNode

HasField LightningAddress "host" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "host" -> (Text -> f Text) -> LightningAddress -> f LightningAddress

HasField LightningAddress "pubkey" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "pubkey" -> (Text -> f Text) -> LightningAddress -> f LightningAddress

HasField Invoice "fallbackAddr" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "fallbackAddr" -> (Text -> f Text) -> Invoice -> f Invoice

HasField Invoice "memo" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "memo" -> (Text -> f Text) -> Invoice -> f Invoice

HasField Invoice "paymentRequest" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "paymentRequest" -> (Text -> f Text) -> Invoice -> f Invoice

HasField HopHint "nodeId" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "nodeId" -> (Text -> f Text) -> HopHint -> f HopHint

HasField Hop "pubKey" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "pubKey" -> (Text -> f Text) -> Hop -> f Hop

HasField GetTransactionsRequest "account" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "account" -> (Text -> f Text) -> GetTransactionsRequest -> f GetTransactionsRequest

HasField GetInfoResponse "alias" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "alias" -> (Text -> f Text) -> GetInfoResponse -> f GetInfoResponse

HasField GetInfoResponse "blockHash" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "blockHash" -> (Text -> f Text) -> GetInfoResponse -> f GetInfoResponse

HasField GetInfoResponse "color" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "color" -> (Text -> f Text) -> GetInfoResponse -> f GetInfoResponse

HasField GetInfoResponse "commitHash" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "commitHash" -> (Text -> f Text) -> GetInfoResponse -> f GetInfoResponse

HasField GetInfoResponse "identityPubkey" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "identityPubkey" -> (Text -> f Text) -> GetInfoResponse -> f GetInfoResponse

HasField GetInfoResponse "version" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "version" -> (Text -> f Text) -> GetInfoResponse -> f GetInfoResponse

HasField Feature "name" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "name" -> (Text -> f Text) -> Feature -> f Feature

HasField EstimateFeeRequest'AddrToAmountEntry "key" Text 
Instance details

Defined in Proto.LndGrpc

HasField DisconnectPeerRequest "pubKey" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "pubKey" -> (Text -> f Text) -> DisconnectPeerRequest -> f DisconnectPeerRequest

HasField DebugLevelResponse "subSystems" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "subSystems" -> (Text -> f Text) -> DebugLevelResponse -> f DebugLevelResponse

HasField DebugLevelRequest "levelSpec" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "levelSpec" -> (Text -> f Text) -> DebugLevelRequest -> f DebugLevelRequest

HasField CloseChannelRequest "deliveryAddress" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "deliveryAddress" -> (Text -> f Text) -> CloseChannelRequest -> f CloseChannelRequest

HasField ChannelPoint "fundingTxidStr" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "fundingTxidStr" -> (Text -> f Text) -> ChannelPoint -> f ChannelPoint

HasField ChannelFeeReport "channelPoint" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "channelPoint" -> (Text -> f Text) -> ChannelFeeReport -> f ChannelFeeReport

HasField ChannelEdgeUpdate "advertisingNode" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "advertisingNode" -> (Text -> f Text) -> ChannelEdgeUpdate -> f ChannelEdgeUpdate

HasField ChannelEdgeUpdate "connectingNode" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "connectingNode" -> (Text -> f Text) -> ChannelEdgeUpdate -> f ChannelEdgeUpdate

HasField ChannelEdge "chanPoint" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "chanPoint" -> (Text -> f Text) -> ChannelEdge -> f ChannelEdge

HasField ChannelEdge "node1Pub" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "node1Pub" -> (Text -> f Text) -> ChannelEdge -> f ChannelEdge

HasField ChannelEdge "node2Pub" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "node2Pub" -> (Text -> f Text) -> ChannelEdge -> f ChannelEdge

HasField ChannelCloseSummary "chainHash" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "chainHash" -> (Text -> f Text) -> ChannelCloseSummary -> f ChannelCloseSummary

HasField ChannelCloseSummary "channelPoint" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "channelPoint" -> (Text -> f Text) -> ChannelCloseSummary -> f ChannelCloseSummary

HasField ChannelCloseSummary "closingTxHash" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "closingTxHash" -> (Text -> f Text) -> ChannelCloseSummary -> f ChannelCloseSummary

HasField ChannelCloseSummary "remotePubkey" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "remotePubkey" -> (Text -> f Text) -> ChannelCloseSummary -> f ChannelCloseSummary

HasField ChannelAcceptResponse "error" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "error" -> (Text -> f Text) -> ChannelAcceptResponse -> f ChannelAcceptResponse

HasField ChannelAcceptResponse "upfrontShutdown" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "upfrontShutdown" -> (Text -> f Text) -> ChannelAcceptResponse -> f ChannelAcceptResponse

HasField Channel "chanStatusFlags" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "chanStatusFlags" -> (Text -> f Text) -> Channel -> f Channel

HasField Channel "channelPoint" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "channelPoint" -> (Text -> f Text) -> Channel -> f Channel

HasField Channel "closeAddress" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "closeAddress" -> (Text -> f Text) -> Channel -> f Channel

HasField Channel "remotePubkey" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "remotePubkey" -> (Text -> f Text) -> Channel -> f Channel

HasField Chain "chain" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "chain" -> (Text -> f Text) -> Chain -> f Chain

HasField Chain "network" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "network" -> (Text -> f Text) -> Chain -> f Chain

HasField BakeMacaroonResponse "macaroon" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "macaroon" -> (Text -> f Text) -> BakeMacaroonResponse -> f BakeMacaroonResponse

HasField AddInvoiceResponse "paymentRequest" Text 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "paymentRequest" -> (Text -> f Text) -> AddInvoiceResponse -> f AddInvoiceResponse

HasField AddHoldInvoiceResp "paymentRequest" Text 
Instance details

Defined in Proto.InvoiceGrpc

Methods

fieldOf :: Functor f => Proxy# "paymentRequest" -> (Text -> f Text) -> AddHoldInvoiceResp -> f AddHoldInvoiceResp

HasField AddHoldInvoiceRequest "fallbackAddr" Text 
Instance details

Defined in Proto.InvoiceGrpc

Methods

fieldOf :: Functor f => Proxy# "fallbackAddr" -> (Text -> f Text) -> AddHoldInvoiceRequest -> f AddHoldInvoiceRequest

HasField AddHoldInvoiceRequest "memo" Text 
Instance details

Defined in Proto.InvoiceGrpc

HasField SendPaymentRequest "paymentRequest" Text 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "paymentRequest" -> (Text -> f Text) -> SendPaymentRequest -> f SendPaymentRequest

HasField LinkFailEvent "failureString" Text 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "failureString" -> (Text -> f Text) -> LinkFailEvent -> f LinkFailEvent

HasField Transaction "destAddresses" [Text] 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "destAddresses" -> ([Text] -> f [Text]) -> Transaction -> f Transaction

HasField Transaction "vec'destAddresses" (Vector Text) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'destAddresses" -> (Vector Text -> f (Vector Text)) -> Transaction -> f Transaction

HasField Op "actions" [Text] 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "actions" -> ([Text] -> f [Text]) -> Op -> f Op

HasField Op "vec'actions" (Vector Text) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'actions" -> (Vector Text -> f (Vector Text)) -> Op -> f Op

HasField NodeUpdate "addresses" [Text] 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "addresses" -> ([Text] -> f [Text]) -> NodeUpdate -> f NodeUpdate

HasField NodeUpdate "vec'addresses" (Vector Text) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'addresses" -> (Vector Text -> f (Vector Text)) -> NodeUpdate -> f NodeUpdate

HasField GetInfoResponse "uris" [Text] 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "uris" -> ([Text] -> f [Text]) -> GetInfoResponse -> f GetInfoResponse

HasField GetInfoResponse "vec'uris" (Vector Text) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'uris" -> (Vector Text -> f (Vector Text)) -> GetInfoResponse -> f GetInfoResponse

HasField ChannelPoint "maybe'fundingTxidStr" (Maybe Text) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "maybe'fundingTxidStr" -> (Maybe Text -> f (Maybe Text)) -> ChannelPoint -> f ChannelPoint

HasField InitWalletRequest "cipherSeedMnemonic" [Text] 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

fieldOf :: Functor f => Proxy# "cipherSeedMnemonic" -> ([Text] -> f [Text]) -> InitWalletRequest -> f InitWalletRequest

HasField InitWalletRequest "vec'cipherSeedMnemonic" (Vector Text) 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'cipherSeedMnemonic" -> (Vector Text -> f (Vector Text)) -> InitWalletRequest -> f InitWalletRequest

HasField GenSeedResponse "cipherSeedMnemonic" [Text] 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

fieldOf :: Functor f => Proxy# "cipherSeedMnemonic" -> ([Text] -> f [Text]) -> GenSeedResponse -> f GenSeedResponse

HasField GenSeedResponse "vec'cipherSeedMnemonic" (Vector Text) 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'cipherSeedMnemonic" -> (Vector Text -> f (Vector Text)) -> GenSeedResponse -> f GenSeedResponse

HasField WalletBalanceResponse "accountBalance" (Map Text WalletAccountBalance) 
Instance details

Defined in Proto.LndGrpc

HasField SendManyRequest "addrToAmount" (Map Text Int64) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "addrToAmount" -> (Map Text Int64 -> f (Map Text Int64)) -> SendManyRequest -> f SendManyRequest

HasField NodeMetricsResponse "betweennessCentrality" (Map Text FloatMetric) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "betweennessCentrality" -> (Map Text FloatMetric -> f (Map Text FloatMetric)) -> NodeMetricsResponse -> f NodeMetricsResponse

HasField ListPermissionsResponse "methodPermissions" (Map Text MacaroonPermissionList) 
Instance details

Defined in Proto.LndGrpc

HasField EstimateFeeRequest "addrToAmount" (Map Text Int64) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "addrToAmount" -> (Map Text Int64 -> f (Map Text Int64)) -> EstimateFeeRequest -> f EstimateFeeRequest

FromPairs Value (DList Pair) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

fromPairs :: DList Pair -> Value

v ~ Value => KeyValuePair v (DList Pair) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

pair :: String -> v -> DList Pair

ToGrpc CipherSeedMnemonic [Text] Source # 
Instance details

Defined in LndClient.Data.Newtype

FromGrpc (TxId a) Text Source # 
Instance details

Defined in LndClient.Data.Newtype

PersistField v => PersistField (Map Text v) 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Map Text v -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Map Text v)

PersistFieldSql v => PersistFieldSql (Map Text v) 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy (Map Text v) -> SqlType

type Item Text 
Instance details

Defined in Data.Text

type Item Text = Char
type State Text 
Instance details

Defined in Data.Attoparsec.Internal.Types

type State Text = Buffer
type Element Text 
Instance details

Defined in Universum.Container.Class

type OneItem Text 
Instance details

Defined in Universum.Container.Class

type ChunkElem Text 
Instance details

Defined in Data.Attoparsec.Internal.Types

type ChunkElem Text = Char

lenientDecode :: OnDecodeError #

Replace an invalid input byte with the Unicode replacement character U+FFFD.

strictDecode :: OnDecodeError #

Throw a UnicodeException if decoding fails.

type OnError a b = String -> Maybe a -> Maybe b #

Function type for handling a coding error. It is supplied with two inputs:

  • A String that describes the error.
  • The input value that caused the error. If the error arose because the end of input was reached or could not be identified precisely, this value will be Nothing.

If the handler returns a value wrapped with Just, that value will be used in the output as the replacement for the invalid input. If it returns Nothing, no value will be used in the output.

Should the handler need to abort processing, it should use error or throw an exception (preferably a UnicodeException). It may use the description provided to construct a more helpful error report.

type OnDecodeError = OnError Word8 Char #

A handler for a decoding error.

exceptToMaybeT :: Functor m => ExceptT e m a -> MaybeT m a #

Convert a ExceptT computation to MaybeT, discarding the value of any exception.

maybeToExceptT :: Functor m => e -> MaybeT m a -> ExceptT e m a #

Convert a MaybeT computation to ExceptT, with a default exception value.

newtype MaybeT (m :: Type -> Type) a #

The parameterizable maybe monad, obtained by composing an arbitrary monad with the Maybe monad.

Computations are actions that may produce a value or exit.

The return function yields a computation that produces that value, while >>= sequences two subcomputations, exiting if either computation does.

Constructors

MaybeT 

Fields

Instances
MonadTrans MaybeT 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

lift :: Monad m => m a -> MaybeT m a #

MonadTransControl MaybeT 
Instance details

Defined in Control.Monad.Trans.Control

Associated Types

type StT MaybeT a :: Type

Methods

liftWith :: Monad m => (Run MaybeT -> m a) -> MaybeT m a

restoreT :: Monad m => m (StT MaybeT a) -> MaybeT m a

MonadState s m => MonadState s (MaybeT m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: MaybeT m s #

put :: s -> MaybeT m () #

state :: (s -> (a, s)) -> MaybeT 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 #

MonadError e m => MonadError e (MaybeT m) 
Instance details

Defined in Control.Monad.Error.Class

Methods

throwError :: e -> MaybeT m a #

catchError :: MaybeT m a -> (e -> MaybeT m a) -> MaybeT m a #

MonadBaseControl b m => MonadBaseControl b (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Control

Associated Types

type StM (MaybeT m) a :: Type

Methods

liftBaseWith :: (RunInBase (MaybeT m) b -> b a) -> MaybeT m a

restoreM :: StM (MaybeT m) a -> MaybeT 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 #

fail :: String -> MaybeT 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 #

MonadFix m => MonadFix (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

mfix :: (a -> MaybeT m a) -> MaybeT m a #

Monad m => MonadFail (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

fail :: String -> MaybeT 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 #

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 #

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 #

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) #

Contravariant m => Contravariant (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

contramap :: (a -> b) -> MaybeT m b -> MaybeT m a #

(>$) :: b -> MaybeT m b -> MaybeT m a #

Eq1 m => Eq1 (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

liftEq :: (a -> b -> Bool) -> MaybeT m a -> MaybeT m b -> Bool #

Ord1 m => Ord1 (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

liftCompare :: (a -> b -> Ordering) -> MaybeT m a -> MaybeT m b -> Ordering #

Read1 m => Read1 (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (MaybeT m a) #

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [MaybeT m a] #

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (MaybeT m a) #

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [MaybeT m a] #

Show1 m => Show1 (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> MaybeT m a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [MaybeT m a] -> ShowS #

MonadZip m => MonadZip (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

mzip :: MaybeT m a -> MaybeT m b -> MaybeT m (a, b) #

mzipWith :: (a -> b -> c) -> MaybeT m a -> MaybeT m b -> MaybeT m c #

munzip :: MaybeT m (a, b) -> (MaybeT m a, MaybeT m b) #

MonadIO m => MonadIO (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

liftIO :: IO a -> MaybeT 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] #

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 #

PrimMonad m => PrimMonad (MaybeT m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (MaybeT m) :: Type

Methods

primitive :: (State# (PrimState (MaybeT m)) -> (#State# (PrimState (MaybeT m)), a#)) -> MaybeT m a

Katip m => Katip (MaybeT m) 
Instance details

Defined in Katip.Core

Methods

getLogEnv :: MaybeT m LogEnv #

localLogEnv :: (LogEnv -> LogEnv) -> MaybeT m a -> MaybeT m a #

(KatipContext m, Katip (MaybeT m)) => KatipContext (MaybeT m) 
Instance details

Defined in Katip.Monadic

MonadCatch m => MonadCatch (MaybeT m) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => MaybeT m a -> (e -> MaybeT m a) -> MaybeT m a

MonadMask m => MonadMask (MaybeT m) 
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) #

MonadThrow m => MonadThrow (MaybeT m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> MaybeT m a

MonadResource m => MonadResource (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

liftResourceT :: ResourceT IO a -> MaybeT m a

MonadLogger m => MonadLogger (MaybeT m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> MaybeT m ()

MonadLoggerIO m => MonadLoggerIO (MaybeT m) 
Instance details

Defined in Control.Monad.Logger

Methods

askLoggerIO :: MaybeT m (Loc -> LogSource -> LogLevel -> LogStr -> IO ())

Zoom m n s t => Zoom (MaybeT m) (MaybeT n) s t 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

zoom :: LensLike' (Zoomed (MaybeT m) c) t s -> MaybeT m c -> MaybeT n c

(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 #

(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 #

(Read1 m, Read a) => Read (MaybeT m a) 
Instance details

Defined in Control.Monad.Trans.Maybe

(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 #

type StT MaybeT a 
Instance details

Defined in Control.Monad.Trans.Control

type StT MaybeT a = Maybe a
type PrimState (MaybeT m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (MaybeT m) = PrimState m
type Zoomed (MaybeT m) 
Instance details

Defined in Lens.Micro.Mtl.Internal

type Zoomed (MaybeT m) = FocusingMay (Zoomed m)
type StM (MaybeT m) a 
Instance details

Defined in Control.Monad.Trans.Control

type StM (MaybeT m) a = ComposeSt MaybeT m a

stopwatch :: IO a -> IO (Timespan, a) #

newtype Timespan #

Constructors

Timespan 

Fields

Instances
Eq Timespan 
Instance details

Defined in Chronos

Ord Timespan 
Instance details

Defined in Chronos

Read Timespan 
Instance details

Defined in Chronos

Show Timespan 
Instance details

Defined in Chronos

Semigroup Timespan 
Instance details

Defined in Chronos

Monoid Timespan 
Instance details

Defined in Chronos

Additive Timespan 
Instance details

Defined in Chronos

FromJSON Timespan 
Instance details

Defined in Chronos

Methods

parseJSON :: Value -> Parser Timespan #

parseJSONList :: Value -> Parser [Timespan] #

ToJSON Timespan 
Instance details

Defined in Chronos

Methods

toJSON :: Timespan -> Value

toEncoding :: Timespan -> Encoding

toJSONList :: [Timespan] -> Value

toEncodingList :: [Timespan] -> Encoding

Scaling Timespan Int64 
Instance details

Defined in Chronos

Methods

scale :: Int64 -> Timespan -> Timespan

Torsor Time Timespan 
Instance details

Defined in Chronos

Methods

add :: Timespan -> Time -> Time

difference :: Time -> Time -> Timespan

data Vector a #

Instances
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 #

fail :: String -> Vector a #

Functor Vector 
Instance details

Defined in Data.Vector

Methods

fmap :: (a -> b) -> Vector a -> Vector b #

(<$) :: a -> Vector b -> Vector a #

MonadFail Vector 
Instance details

Defined in Data.Vector

Methods

fail :: String -> 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 #

Foldable Vector 
Instance details

Defined in Data.Vector

Methods

fold :: Monoid m => Vector m -> 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 #

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) #

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 #

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) #

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] #

MonadPlus Vector 
Instance details

Defined in Data.Vector

Methods

mzero :: Vector a #

mplus :: Vector a -> Vector a -> Vector a #

NFData1 Vector 
Instance details

Defined in Data.Vector

Methods

liftRnf :: (a -> ()) -> Vector a -> () #

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

Vector Vector a 
Instance details

Defined in Data.Vector

Methods

basicUnsafeFreeze :: PrimMonad m => Mutable Vector (PrimState m) a -> m (Vector a)

basicUnsafeThaw :: PrimMonad m => Vector a -> m (Mutable Vector (PrimState m) a)

basicLength :: Vector a -> Int

basicUnsafeSlice :: Int -> Int -> Vector a -> Vector a

basicUnsafeIndexM :: Monad m => Vector a -> Int -> m a

basicUnsafeCopy :: PrimMonad m => Mutable Vector (PrimState m) a -> Vector a -> m ()

elemseq :: Vector a -> a -> b -> b

HasField TransactionDetails "vec'transactions" (Vector Transaction) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'transactions" -> (Vector Transaction -> f (Vector Transaction)) -> TransactionDetails -> f TransactionDetails

HasField Transaction "vec'destAddresses" (Vector Text) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'destAddresses" -> (Vector Text -> f (Vector Text)) -> Transaction -> f Transaction

HasField SendRequest "vec'destFeatures" (Vector FeatureBit) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'destFeatures" -> (Vector FeatureBit -> f (Vector FeatureBit)) -> SendRequest -> f SendRequest

HasField RouteHint "vec'hopHints" (Vector HopHint) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'hopHints" -> (Vector HopHint -> f (Vector HopHint)) -> RouteHint -> f RouteHint

HasField Route "vec'hops" (Vector Hop) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'hops" -> (Vector Hop -> f (Vector Hop)) -> Route -> f Route

HasField QueryRoutesResponse "vec'routes" (Vector Route) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'routes" -> (Vector Route -> f (Vector Route)) -> QueryRoutesResponse -> f QueryRoutesResponse

HasField QueryRoutesRequest "vec'destFeatures" (Vector FeatureBit) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'destFeatures" -> (Vector FeatureBit -> f (Vector FeatureBit)) -> QueryRoutesRequest -> f QueryRoutesRequest

HasField QueryRoutesRequest "vec'ignoredEdges" (Vector EdgeLocator) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'ignoredEdges" -> (Vector EdgeLocator -> f (Vector EdgeLocator)) -> QueryRoutesRequest -> f QueryRoutesRequest

HasField QueryRoutesRequest "vec'ignoredNodes" (Vector ByteString) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'ignoredNodes" -> (Vector ByteString -> f (Vector ByteString)) -> QueryRoutesRequest -> f QueryRoutesRequest

HasField QueryRoutesRequest "vec'ignoredPairs" (Vector NodePair) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'ignoredPairs" -> (Vector NodePair -> f (Vector NodePair)) -> QueryRoutesRequest -> f QueryRoutesRequest

HasField QueryRoutesRequest "vec'routeHints" (Vector RouteHint) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'routeHints" -> (Vector RouteHint -> f (Vector RouteHint)) -> QueryRoutesRequest -> f QueryRoutesRequest

HasField PendingChannelsResponse'ForceClosedChannel "vec'pendingHtlcs" (Vector PendingHTLC) 
Instance details

Defined in Proto.LndGrpc

HasField PendingChannelsResponse "vec'pendingClosingChannels" (Vector PendingChannelsResponse'ClosedChannel) 
Instance details

Defined in Proto.LndGrpc

HasField PendingChannelsResponse "vec'pendingForceClosingChannels" (Vector PendingChannelsResponse'ForceClosedChannel) 
Instance details

Defined in Proto.LndGrpc

HasField PendingChannelsResponse "vec'pendingOpenChannels" (Vector PendingChannelsResponse'PendingOpenChannel) 
Instance details

Defined in Proto.LndGrpc

HasField PendingChannelsResponse "vec'waitingCloseChannels" (Vector PendingChannelsResponse'WaitingCloseChannel) 
Instance details

Defined in Proto.LndGrpc

HasField Peer "vec'errors" (Vector TimestampedError) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'errors" -> (Vector TimestampedError -> f (Vector TimestampedError)) -> Peer -> f Peer

HasField Payment "vec'htlcs" (Vector HTLCAttempt) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'htlcs" -> (Vector HTLCAttempt -> f (Vector HTLCAttempt)) -> Payment -> f Payment

HasField PayReq "vec'routeHints" (Vector RouteHint) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'routeHints" -> (Vector RouteHint -> f (Vector RouteHint)) -> PayReq -> f PayReq

HasField Op "vec'actions" (Vector Text) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'actions" -> (Vector Text -> f (Vector Text)) -> Op -> f Op

HasField NodeUpdate "vec'addresses" (Vector Text) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'addresses" -> (Vector Text -> f (Vector Text)) -> NodeUpdate -> f NodeUpdate

HasField NodeUpdate "vec'nodeAddresses" (Vector NodeAddress) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'nodeAddresses" -> (Vector NodeAddress -> f (Vector NodeAddress)) -> NodeUpdate -> f NodeUpdate

HasField NodeMetricsRequest "vec'types" (Vector NodeMetricType) 
Instance details

Defined in Proto.LndGrpc

HasField NodeInfo "vec'channels" (Vector ChannelEdge) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'channels" -> (Vector ChannelEdge -> f (Vector ChannelEdge)) -> NodeInfo -> f NodeInfo

HasField MultiChanBackup "vec'chanPoints" (Vector ChannelPoint) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'chanPoints" -> (Vector ChannelPoint -> f (Vector ChannelPoint)) -> MultiChanBackup -> f MultiChanBackup

HasField MacaroonPermissionList "vec'permissions" (Vector MacaroonPermission) 
Instance details

Defined in Proto.LndGrpc

HasField MacaroonId "vec'ops" (Vector Op) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'ops" -> (Vector Op -> f (Vector Op)) -> MacaroonId -> f MacaroonId

HasField ListUnspentResponse "vec'utxos" (Vector Utxo) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'utxos" -> (Vector Utxo -> f (Vector Utxo)) -> ListUnspentResponse -> f ListUnspentResponse

HasField ListPeersResponse "vec'peers" (Vector Peer) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'peers" -> (Vector Peer -> f (Vector Peer)) -> ListPeersResponse -> f ListPeersResponse

HasField ListPaymentsResponse "vec'payments" (Vector Payment) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'payments" -> (Vector Payment -> f (Vector Payment)) -> ListPaymentsResponse -> f ListPaymentsResponse

HasField ListInvoiceResponse "vec'invoices" (Vector Invoice) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'invoices" -> (Vector Invoice -> f (Vector Invoice)) -> ListInvoiceResponse -> f ListInvoiceResponse

HasField ListChannelsResponse "vec'channels" (Vector Channel) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'channels" -> (Vector Channel -> f (Vector Channel)) -> ListChannelsResponse -> f ListChannelsResponse

HasField LightningNode "vec'addresses" (Vector NodeAddress) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'addresses" -> (Vector NodeAddress -> f (Vector NodeAddress)) -> LightningNode -> f LightningNode

HasField Invoice "vec'htlcs" (Vector InvoiceHTLC) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'htlcs" -> (Vector InvoiceHTLC -> f (Vector InvoiceHTLC)) -> Invoice -> f Invoice

HasField Invoice "vec'routeHints" (Vector RouteHint) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'routeHints" -> (Vector RouteHint -> f (Vector RouteHint)) -> Invoice -> f Invoice

HasField GraphTopologyUpdate "vec'channelUpdates" (Vector ChannelEdgeUpdate) 
Instance details

Defined in Proto.LndGrpc

HasField GraphTopologyUpdate "vec'closedChans" (Vector ClosedChannelUpdate) 
Instance details

Defined in Proto.LndGrpc

HasField GraphTopologyUpdate "vec'nodeUpdates" (Vector NodeUpdate) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'nodeUpdates" -> (Vector NodeUpdate -> f (Vector NodeUpdate)) -> GraphTopologyUpdate -> f GraphTopologyUpdate

HasField GetInfoResponse "vec'chains" (Vector Chain) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'chains" -> (Vector Chain -> f (Vector Chain)) -> GetInfoResponse -> f GetInfoResponse

HasField GetInfoResponse "vec'uris" (Vector Text) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'uris" -> (Vector Text -> f (Vector Text)) -> GetInfoResponse -> f GetInfoResponse

HasField ForwardingHistoryResponse "vec'forwardingEvents" (Vector ForwardingEvent) 
Instance details

Defined in Proto.LndGrpc

HasField FeeReportResponse "vec'channelFees" (Vector ChannelFeeReport) 
Instance details

Defined in Proto.LndGrpc

HasField ClosedChannelsResponse "vec'channels" (Vector ChannelCloseSummary) 
Instance details

Defined in Proto.LndGrpc

HasField ChannelGraph "vec'edges" (Vector ChannelEdge) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'edges" -> (Vector ChannelEdge -> f (Vector ChannelEdge)) -> ChannelGraph -> f ChannelGraph

HasField ChannelGraph "vec'nodes" (Vector LightningNode) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'nodes" -> (Vector LightningNode -> f (Vector LightningNode)) -> ChannelGraph -> f ChannelGraph

HasField ChannelCloseSummary "vec'resolutions" (Vector Resolution) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'resolutions" -> (Vector Resolution -> f (Vector Resolution)) -> ChannelCloseSummary -> f ChannelCloseSummary

HasField ChannelBackups "vec'chanBackups" (Vector ChannelBackup) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'chanBackups" -> (Vector ChannelBackup -> f (Vector ChannelBackup)) -> ChannelBackups -> f ChannelBackups

HasField Channel "vec'pendingHtlcs" (Vector HTLC) 
Instance details

Defined in Proto.LndGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'pendingHtlcs" -> (Vector HTLC -> f (Vector HTLC)) -> Channel -> f Channel

HasField BakeMacaroonRequest "vec'permissions" (Vector MacaroonPermission) 
Instance details

Defined in Proto.LndGrpc

HasField AddHoldInvoiceRequest "vec'routeHints" (Vector RouteHint) 
Instance details

Defined in Proto.InvoiceGrpc

HasField XImportMissionControlRequest "vec'pairs" (Vector PairHistory) 
Instance details

Defined in Proto.RouterGrpc

HasField SendPaymentRequest "vec'destFeatures" (Vector FeatureBit) 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'destFeatures" -> (Vector FeatureBit -> f (Vector FeatureBit)) -> SendPaymentRequest -> f SendPaymentRequest

HasField SendPaymentRequest "vec'routeHints" (Vector RouteHint) 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'routeHints" -> (Vector RouteHint -> f (Vector RouteHint)) -> SendPaymentRequest -> f SendPaymentRequest

HasField QueryMissionControlResponse "vec'pairs" (Vector PairHistory) 
Instance details

Defined in Proto.RouterGrpc

HasField PaymentStatus "vec'htlcs" (Vector HTLCAttempt) 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'htlcs" -> (Vector HTLCAttempt -> f (Vector HTLCAttempt)) -> PaymentStatus -> f PaymentStatus

HasField BuildRouteRequest "vec'hopPubkeys" (Vector ByteString) 
Instance details

Defined in Proto.RouterGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'hopPubkeys" -> (Vector ByteString -> f (Vector ByteString)) -> BuildRouteRequest -> f BuildRouteRequest

HasField InitWalletRequest "vec'cipherSeedMnemonic" (Vector Text) 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'cipherSeedMnemonic" -> (Vector Text -> f (Vector Text)) -> InitWalletRequest -> f InitWalletRequest

HasField GenSeedResponse "vec'cipherSeedMnemonic" (Vector Text) 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'cipherSeedMnemonic" -> (Vector Text -> f (Vector Text)) -> GenSeedResponse -> f GenSeedResponse

IsList (Vector a) 
Instance details

Defined in Data.Vector

Associated Types

type Item (Vector a) :: Type #

Methods

fromList :: [Item (Vector a)] -> Vector a #

fromListN :: Int -> [Item (Vector a)] -> Vector a #

toList :: Vector a -> [Item (Vector a)] #

Eq a => Eq (Vector a) 
Instance details

Defined in Data.Vector

Methods

(==) :: Vector a -> Vector a -> Bool #

(/=) :: Vector a -> Vector a -> Bool #

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 :: (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) #

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 #

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 #

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 #

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 #

NFData a => NFData (Vector a) 
Instance details

Defined in Data.Vector

Methods

rnf :: Vector a -> () #

FromJSON a => FromJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Vector a) #

parseJSONList :: Value -> Parser [Vector a] #

ToJSON a => ToJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Vector a -> Value

toEncoding :: Vector a -> Encoding

toJSONList :: [Vector a] -> Value

toEncodingList :: [Vector a] -> Encoding

PersistField a => PersistField (Vector a) 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Vector a -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Vector a)

PersistFieldSql a => PersistFieldSql (Vector a) 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy (Vector a) -> SqlType

Container (Vector a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Vector a) :: Type #

Methods

toList :: Vector a -> [Element (Vector a)] #

null :: Vector a -> Bool #

foldr :: (Element (Vector a) -> b -> b) -> b -> Vector a -> b #

foldl :: (b -> Element (Vector a) -> b) -> b -> Vector a -> b #

foldl' :: (b -> Element (Vector a) -> b) -> b -> Vector a -> b #

length :: Vector a -> Int #

elem :: Element (Vector a) -> Vector a -> Bool #

maximum :: Vector a -> Element (Vector a) #

minimum :: Vector a -> Element (Vector a) #

foldMap :: Monoid m => (Element (Vector a) -> m) -> Vector a -> m #

fold :: Vector a -> Element (Vector a) #

foldr' :: (Element (Vector a) -> b -> b) -> b -> Vector a -> b #

foldr1 :: (Element (Vector a) -> Element (Vector a) -> Element (Vector a)) -> Vector a -> Element (Vector a) #

foldl1 :: (Element (Vector a) -> Element (Vector a) -> Element (Vector a)) -> Vector a -> Element (Vector a) #

notElem :: Element (Vector a) -> Vector a -> Bool #

all :: (Element (Vector a) -> Bool) -> Vector a -> Bool #

any :: (Element (Vector a) -> Bool) -> Vector a -> Bool #

and :: Vector a -> Bool #

or :: Vector a -> Bool #

find :: (Element (Vector a) -> Bool) -> Vector a -> Maybe (Element (Vector a)) #

safeHead :: Vector a -> Maybe (Element (Vector a)) #

One (Vector a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (Vector a) :: Type #

Methods

one :: OneItem (Vector a) -> Vector a #

ToBinary (Vector Word8) 
Instance details

Defined in Codec.QRCode.Data.ToInput

Methods

toBinary :: Vector Word8 -> [Word8]

type Mutable Vector 
Instance details

Defined in Data.Vector

type Mutable Vector = MVector
type Item (Vector a) 
Instance details

Defined in Data.Vector

type Item (Vector a) = a
type Element (Vector a) 
Instance details

Defined in Universum.Container.Class

type Element (Vector a) = ElementDefault (Vector a)
type OneItem (Vector a) 
Instance details

Defined in Universum.Container.Class

type OneItem (Vector a) = a

class FromJSON a where #

Minimal complete definition

Nothing

Methods

parseJSON :: Value -> Parser a #

parseJSONList :: Value -> Parser [a] #

Instances
FromJSON Bool 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Bool #

parseJSONList :: Value -> Parser [Bool] #

FromJSON Char 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Char #

parseJSONList :: Value -> Parser [Char] #

FromJSON Double 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Double #

parseJSONList :: Value -> Parser [Double] #

FromJSON Float 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Float #

parseJSONList :: Value -> Parser [Float] #

FromJSON Int 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Int #

parseJSONList :: Value -> Parser [Int] #

FromJSON Int8 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Int8 #

parseJSONList :: Value -> Parser [Int8] #

FromJSON Int16 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Int16 #

parseJSONList :: Value -> Parser [Int16] #

FromJSON Int32 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Int32 #

parseJSONList :: Value -> Parser [Int32] #

FromJSON Int64 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Int64 #

parseJSONList :: Value -> Parser [Int64] #

FromJSON Integer 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Integer #

parseJSONList :: Value -> Parser [Integer] #

FromJSON Natural 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Natural #

parseJSONList :: Value -> Parser [Natural] #

FromJSON Ordering 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Ordering #

parseJSONList :: Value -> Parser [Ordering] #

FromJSON Word 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Word #

parseJSONList :: Value -> Parser [Word] #

FromJSON Word8 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Word8 #

parseJSONList :: Value -> Parser [Word8] #

FromJSON Word16 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Word16 #

parseJSONList :: Value -> Parser [Word16] #

FromJSON Word32 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Word32 #

parseJSONList :: Value -> Parser [Word32] #

FromJSON Word64 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Word64 #

parseJSONList :: Value -> Parser [Word64] #

FromJSON () 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser () #

parseJSONList :: Value -> Parser [()] #

FromJSON Void 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Void #

parseJSONList :: Value -> Parser [Void] #

FromJSON Version 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Version #

parseJSONList :: Value -> Parser [Version] #

FromJSON CTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser CTime #

parseJSONList :: Value -> Parser [CTime] #

FromJSON IntSet 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser IntSet #

parseJSONList :: Value -> Parser [IntSet] #

FromJSON Text 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Text #

parseJSONList :: Value -> Parser [Text] #

FromJSON Text 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Text #

parseJSONList :: Value -> Parser [Text] #

FromJSON ZonedTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser ZonedTime #

parseJSONList :: Value -> Parser [ZonedTime] #

FromJSON LocalTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser LocalTime #

parseJSONList :: Value -> Parser [LocalTime] #

FromJSON TimeOfDay 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser TimeOfDay #

parseJSONList :: Value -> Parser [TimeOfDay] #

FromJSON UTCTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser UTCTime #

parseJSONList :: Value -> Parser [UTCTime] #

FromJSON SystemTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser SystemTime #

parseJSONList :: Value -> Parser [SystemTime] #

FromJSON NominalDiffTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser NominalDiffTime #

parseJSONList :: Value -> Parser [NominalDiffTime] #

FromJSON DiffTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser DiffTime #

parseJSONList :: Value -> Parser [DiffTime] #

FromJSON Day 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Day #

parseJSONList :: Value -> Parser [Day] #

FromJSON Day 
Instance details

Defined in Chronos

Methods

parseJSON :: Value -> Parser Day #

parseJSONList :: Value -> Parser [Day] #

FromJSON Offset 
Instance details

Defined in Chronos

Methods

parseJSON :: Value -> Parser Offset #

parseJSONList :: Value -> Parser [Offset] #

FromJSON Time 
Instance details

Defined in Chronos

Methods

parseJSON :: Value -> Parser Time #

parseJSONList :: Value -> Parser [Time] #

FromJSON Timespan 
Instance details

Defined in Chronos

Methods

parseJSON :: Value -> Parser Timespan #

parseJSONList :: Value -> Parser [Timespan] #

FromJSON Value 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Value #

parseJSONList :: Value -> Parser [Value] #

FromJSON DotNetTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser DotNetTime #

parseJSONList :: Value -> Parser [DotNetTime] #

FromJSON PersistValue 
Instance details

Defined in Database.Persist.Types.Base

Methods

parseJSON :: Value -> Parser PersistValue #

parseJSONList :: Value -> Parser [PersistValue] #

FromJSON Environment 
Instance details

Defined in Katip.Core

Methods

parseJSON :: Value -> Parser Environment #

parseJSONList :: Value -> Parser [Environment] #

FromJSON LogStr 
Instance details

Defined in Katip.Core

Methods

parseJSON :: Value -> Parser LogStr #

parseJSONList :: Value -> Parser [LogStr] #

FromJSON Namespace 
Instance details

Defined in Katip.Core

Methods

parseJSON :: Value -> Parser Namespace #

parseJSONList :: Value -> Parser [Namespace] #

FromJSON Severity 
Instance details

Defined in Katip.Core

Methods

parseJSON :: Value -> Parser Severity #

parseJSONList :: Value -> Parser [Severity] #

FromJSON ThreadIdText 
Instance details

Defined in Katip.Core

Methods

parseJSON :: Value -> Parser ThreadIdText #

parseJSONList :: Value -> Parser [ThreadIdText] #

FromJSON Verbosity 
Instance details

Defined in Katip.Core

Methods

parseJSON :: Value -> Parser Verbosity #

parseJSONList :: Value -> Parser [Verbosity] #

FromJSON Scientific 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Scientific #

parseJSONList :: Value -> Parser [Scientific] #

FromJSON LocJs 
Instance details

Defined in Katip.Core

Methods

parseJSON :: Value -> Parser LocJs #

parseJSONList :: Value -> Parser [LocJs] #

FromJSON ProcessIDJs 
Instance details

Defined in Katip.Core

Methods

parseJSON :: Value -> Parser ProcessIDJs #

parseJSONList :: Value -> Parser [ProcessIDJs] #

FromJSON UUID 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser UUID #

parseJSONList :: Value -> Parser [UUID] #

FromJSON CalendarDiffDays 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser CalendarDiffDays #

parseJSONList :: Value -> Parser [CalendarDiffDays] #

FromJSON CalendarDiffTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser CalendarDiffTime #

parseJSONList :: Value -> Parser [CalendarDiffTime] #

FromJSON DayOfWeek 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser DayOfWeek #

parseJSONList :: Value -> Parser [DayOfWeek] #

FromJSON GrpcTimeoutSeconds Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

parseJSON :: Value -> Parser GrpcTimeoutSeconds #

parseJSONList :: Value -> Parser [GrpcTimeoutSeconds] #

FromJSON Seconds Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

parseJSON :: Value -> Parser Seconds #

parseJSONList :: Value -> Parser [Seconds] #

FromJSON AezeedPassphrase Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

parseJSON :: Value -> Parser AezeedPassphrase #

parseJSONList :: Value -> Parser [AezeedPassphrase] #

FromJSON CipherSeedMnemonic Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

parseJSON :: Value -> Parser CipherSeedMnemonic #

parseJSONList :: Value -> Parser [CipherSeedMnemonic] #

FromJSON Sat Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

parseJSON :: Value -> Parser Sat #

parseJSONList :: Value -> Parser [Sat] #

FromJSON MSat Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

parseJSON :: Value -> Parser MSat #

parseJSONList :: Value -> Parser [MSat] #

FromJSON LndEnv Source # 
Instance details

Defined in LndClient.Data.LndEnv

Methods

parseJSON :: Value -> Parser LndEnv #

parseJSONList :: Value -> Parser [LndEnv] #

FromJSON RawConfig Source # 
Instance details

Defined in LndClient.Data.LndEnv

Methods

parseJSON :: Value -> Parser RawConfig #

parseJSONList :: Value -> Parser [RawConfig] #

FromJSON LndPort Source # 
Instance details

Defined in LndClient.Data.LndEnv

Methods

parseJSON :: Value -> Parser LndPort #

parseJSONList :: Value -> Parser [LndPort] #

FromJSON LndHost Source # 
Instance details

Defined in LndClient.Data.LndEnv

Methods

parseJSON :: Value -> Parser LndHost #

parseJSONList :: Value -> Parser [LndHost] #

FromJSON LndHexMacaroon Source # 
Instance details

Defined in LndClient.Data.LndEnv

Methods

parseJSON :: Value -> Parser LndHexMacaroon #

parseJSONList :: Value -> Parser [LndHexMacaroon] #

FromJSON LndTlsCert Source # 
Instance details

Defined in LndClient.Data.LndEnv

Methods

parseJSON :: Value -> Parser LndTlsCert #

parseJSONList :: Value -> Parser [LndTlsCert] #

FromJSON LndWalletPassword Source # 
Instance details

Defined in LndClient.Data.LndEnv

Methods

parseJSON :: Value -> Parser LndWalletPassword #

parseJSONList :: Value -> Parser [LndWalletPassword] #

FromJSON Block 
Instance details

Defined in Network.Bitcoin.BlockChain

Methods

parseJSON :: Value -> Parser Block #

parseJSONList :: Value -> Parser [Block] #

FromJSON OutputInfo 
Instance details

Defined in Network.Bitcoin.BlockChain

Methods

parseJSON :: Value -> Parser OutputInfo #

parseJSONList :: Value -> Parser [OutputInfo] #

FromJSON OutputSetInfo 
Instance details

Defined in Network.Bitcoin.BlockChain

Methods

parseJSON :: Value -> Parser OutputSetInfo #

parseJSONList :: Value -> Parser [OutputSetInfo] #

FromJSON BlockTemplate 
Instance details

Defined in Network.Bitcoin.Mining

Methods

parseJSON :: Value -> Parser BlockTemplate #

parseJSONList :: Value -> Parser [BlockTemplate] #

FromJSON CoinBaseAux 
Instance details

Defined in Network.Bitcoin.Mining

Methods

parseJSON :: Value -> Parser CoinBaseAux #

parseJSONList :: Value -> Parser [CoinBaseAux] #

FromJSON HashData 
Instance details

Defined in Network.Bitcoin.Mining

Methods

parseJSON :: Value -> Parser HashData #

parseJSONList :: Value -> Parser [HashData] #

FromJSON MiningInfo 
Instance details

Defined in Network.Bitcoin.Mining

Methods

parseJSON :: Value -> Parser MiningInfo #

parseJSONList :: Value -> Parser [MiningInfo] #

FromJSON Transaction 
Instance details

Defined in Network.Bitcoin.Mining

Methods

parseJSON :: Value -> Parser Transaction #

parseJSONList :: Value -> Parser [Transaction] #

FromJSON StupidReturnValue 
Instance details

Defined in Network.Bitcoin.Mining

Methods

parseJSON :: Value -> Parser StupidReturnValue #

parseJSONList :: Value -> Parser [StupidReturnValue] #

FromJSON Nil 
Instance details

Defined in Network.Bitcoin.Internal

Methods

parseJSON :: Value -> Parser Nil #

parseJSONList :: Value -> Parser [Nil] #

FromJSON NilOrArray 
Instance details

Defined in Network.Bitcoin.Internal

Methods

parseJSON :: Value -> Parser NilOrArray #

parseJSONList :: Value -> Parser [NilOrArray] #

FromJSON BitcoinRpcError 
Instance details

Defined in Network.Bitcoin.Internal

Methods

parseJSON :: Value -> Parser BitcoinRpcError #

parseJSONList :: Value -> Parser [BitcoinRpcError] #

FromJSON a => FromJSON [a] 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser [a] #

parseJSONList :: Value -> Parser [[a]] #

FromJSON a => FromJSON (Maybe a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Maybe a) #

parseJSONList :: Value -> Parser [Maybe a] #

(FromJSON a, Integral a) => FromJSON (Ratio a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Ratio a) #

parseJSONList :: Value -> Parser [Ratio a] #

HasResolution a => FromJSON (Fixed a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Fixed a) #

parseJSONList :: Value -> Parser [Fixed a] #

FromJSON a => FromJSON (Min a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Min a) #

parseJSONList :: Value -> Parser [Min a] #

FromJSON a => FromJSON (Max a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Max a) #

parseJSONList :: Value -> Parser [Max a] #

FromJSON a => FromJSON (First a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (First a) #

parseJSONList :: Value -> Parser [First a] #

FromJSON a => FromJSON (Last a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Last a) #

parseJSONList :: Value -> Parser [Last a] #

FromJSON a => FromJSON (WrappedMonoid a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (WrappedMonoid a) #

parseJSONList :: Value -> Parser [WrappedMonoid a] #

FromJSON a => FromJSON (Option a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Option a) #

parseJSONList :: Value -> Parser [Option a] #

FromJSON a => FromJSON (Identity a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Identity a) #

parseJSONList :: Value -> Parser [Identity a] #

FromJSON a => FromJSON (First a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (First a) #

parseJSONList :: Value -> Parser [First a] #

FromJSON a => FromJSON (Last a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Last a) #

parseJSONList :: Value -> Parser [Last a] #

FromJSON a => FromJSON (Dual a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Dual a) #

parseJSONList :: Value -> Parser [Dual a] #

FromJSON a => FromJSON (NonEmpty a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (NonEmpty a) #

parseJSONList :: Value -> Parser [NonEmpty a] #

FromJSON a => FromJSON (IntMap a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (IntMap a) #

parseJSONList :: Value -> Parser [IntMap a] #

FromJSON v => FromJSON (Tree v) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Tree v) #

parseJSONList :: Value -> Parser [Tree v] #

FromJSON a => FromJSON (Seq a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Seq a) #

parseJSONList :: Value -> Parser [Seq a] #

(Ord a, FromJSON a) => FromJSON (Set a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Set a) #

parseJSONList :: Value -> Parser [Set a] #

FromJSON a => FromJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Vector a) #

parseJSONList :: Value -> Parser [Vector a] #

(Vector Vector a, FromJSON a) => FromJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Vector a) #

parseJSONList :: Value -> Parser [Vector a] #

(Prim a, FromJSON a) => FromJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Vector a) #

parseJSONList :: Value -> Parser [Vector a] #

FromJSON a => FromJSON (Item a) 
Instance details

Defined in Katip.Core

Methods

parseJSON :: Value -> Parser (Item a) #

parseJSONList :: Value -> Parser [Item a] #

(Eq a, Hashable a, FromJSON a) => FromJSON (HashSet a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (HashSet a) #

parseJSONList :: Value -> Parser [HashSet a] #

FromJSON a => FromJSON (DList a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (DList a) #

parseJSONList :: Value -> Parser [DList a] #

(Storable a, FromJSON a) => FromJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Vector a) #

parseJSONList :: Value -> Parser [Vector a] #

FromJSON a => FromJSON (Array a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Array a) #

parseJSONList :: Value -> Parser [Array a] #

(Prim a, FromJSON a) => FromJSON (PrimArray a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (PrimArray a) #

parseJSONList :: Value -> Parser [PrimArray a] #

FromJSON a => FromJSON (SmallArray a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (SmallArray a) #

parseJSONList :: Value -> Parser [SmallArray a] #

(PrimUnlifted a, FromJSON a) => FromJSON (UnliftedArray a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (UnliftedArray a) #

parseJSONList :: Value -> Parser [UnliftedArray a] #

FromJSON a => FromJSON (BitcoinRpcResponse a) 
Instance details

Defined in Network.Bitcoin.Internal

Methods

parseJSON :: Value -> Parser (BitcoinRpcResponse a) #

parseJSONList :: Value -> Parser [BitcoinRpcResponse a] #

(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] #

(FromJSON a, FromJSON b) => FromJSON (a, b) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (a, b) #

parseJSONList :: Value -> Parser [(a, b)] #

FromJSON (Proxy a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Proxy a) #

parseJSONList :: Value -> Parser [Proxy a] #

(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] #

(FromJSON v, FromJSONKey k, Eq k, Hashable k) => FromJSON (HashMap k v) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (HashMap k v) #

parseJSONList :: Value -> Parser [HashMap k v] #

(FromJSON a, FromJSON b, FromJSON c) => FromJSON (a, b, c) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (a, b, c) #

parseJSONList :: Value -> Parser [(a, b, c)] #

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 b => FromJSON (Tagged a b) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Tagged a b) #

parseJSONList :: Value -> Parser [Tagged a b] #

(FromJSON a, FromJSON b, FromJSON c, FromJSON d) => FromJSON (a, b, c, d) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (a, b, c, d) #

parseJSONList :: Value -> Parser [(a, b, c, d)] #

(FromJSON1 f, FromJSON1 g, FromJSON a) => FromJSON (Product f g a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Product f g a) #

parseJSONList :: Value -> Parser [Product f g a] #

(FromJSON1 f, FromJSON1 g, FromJSON a) => FromJSON (Sum f g a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Sum f g a) #

parseJSONList :: Value -> Parser [Sum f g a] #

(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e) => FromJSON (a, b, c, d, e) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (a, b, c, d, e) #

parseJSONList :: Value -> Parser [(a, b, c, d, e)] #

(FromJSON1 f, FromJSON1 g, FromJSON a) => FromJSON (Compose f g a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Compose f g a) #

parseJSONList :: Value -> Parser [Compose f g a] #

(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f) => FromJSON (a, b, c, d, e, f) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (a, b, c, d, e, f) #

parseJSONList :: Value -> Parser [(a, b, c, d, e, f)] #

(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g) => FromJSON (a, b, c, d, e, f, g) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (a, b, c, d, e, f, g) #

parseJSONList :: Value -> Parser [(a, b, c, d, e, f, g)] #

(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g, FromJSON h) => FromJSON (a, b, c, d, e, f, g, h) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (a, b, c, d, e, f, g, h) #

parseJSONList :: Value -> Parser [(a, b, c, d, e, f, g, h)] #

(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g, FromJSON h, FromJSON i) => FromJSON (a, b, c, d, e, f, g, h, i) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (a, b, c, d, e, f, g, h, i) #

parseJSONList :: Value -> Parser [(a, b, c, d, e, f, g, h, i)] #

(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g, FromJSON h, FromJSON i, FromJSON j) => FromJSON (a, b, c, d, e, f, g, h, i, j) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (a, b, c, d, e, f, g, h, i, j) #

parseJSONList :: Value -> Parser [(a, b, c, d, e, f, g, h, i, j)] #

(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g, FromJSON h, FromJSON i, FromJSON j, FromJSON k) => FromJSON (a, b, c, d, e, f, g, h, i, j, k) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (a, b, c, d, e, f, g, h, i, j, k) #

parseJSONList :: Value -> Parser [(a, b, c, d, e, f, g, h, i, j, k)] #

(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g, FromJSON h, FromJSON i, FromJSON j, FromJSON k, FromJSON l) => FromJSON (a, b, c, d, e, f, g, h, i, j, k, l) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (a, b, c, d, e, f, g, h, i, j, k, l) #

parseJSONList :: Value -> Parser [(a, b, c, d, e, f, g, h, i, j, k, l)] #

(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g, FromJSON h, FromJSON i, FromJSON j, FromJSON k, FromJSON l, FromJSON m) => FromJSON (a, b, c, d, e, f, g, h, i, j, k, l, m) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (a, b, c, d, e, f, g, h, i, j, k, l, m) #

parseJSONList :: Value -> Parser [(a, b, c, d, e, f, g, h, i, j, k, l, m)] #

(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g, FromJSON h, FromJSON i, FromJSON j, FromJSON k, FromJSON l, FromJSON m, FromJSON n) => FromJSON (a, b, c, d, e, f, g, h, i, j, k, l, m, n) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (a, b, c, d, e, f, g, h, i, j, k, l, m, n) #

parseJSONList :: Value -> Parser [(a, b, c, d, e, f, g, h, i, j, k, l, m, n)] #

(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g, FromJSON h, FromJSON i, FromJSON j, FromJSON k, FromJSON l, FromJSON m, FromJSON n, FromJSON o) => FromJSON (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) #

parseJSONList :: Value -> Parser [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)] #

class Hashable a where #

Minimal complete definition

Nothing

Methods

hashWithSalt :: Int -> a -> Int #

Instances
Hashable Bool 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Bool -> Int #

hash :: Bool -> Int

Hashable Char 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Char -> Int #

hash :: Char -> Int

Hashable Double 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Double -> Int #

hash :: Double -> Int

Hashable Float 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Float -> Int #

hash :: Float -> Int

Hashable Int 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int -> Int #

hash :: Int -> Int

Hashable Int8 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int8 -> Int #

hash :: Int8 -> Int

Hashable Int16 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int16 -> Int #

hash :: Int16 -> Int

Hashable Int32 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int32 -> Int #

hash :: Int32 -> Int

Hashable Int64 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int64 -> Int #

hash :: Int64 -> Int

Hashable 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 Ordering 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Ordering -> Int #

hash :: Ordering -> Int

Hashable Word 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word -> Int #

hash :: Word -> Int

Hashable Word8 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word8 -> Int #

hash :: Word8 -> 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 SomeTypeRep 
Instance details

Defined in Data.Hashable.Class

Hashable () 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> () -> Int #

hash :: () -> Int

Hashable BigNat 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> BigNat -> Int #

hash :: BigNat -> Int

Hashable Void 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Void -> Int #

hash :: Void -> Int

Hashable Unique 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Unique -> Int #

hash :: Unique -> Int

Hashable Version 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Version -> Int #

hash :: Version -> Int

Hashable ThreadId 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> ThreadId -> Int #

hash :: ThreadId -> Int

Hashable WordPtr 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> WordPtr -> Int #

hash :: WordPtr -> Int

Hashable IntPtr 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> IntPtr -> Int #

hash :: IntPtr -> Int

Hashable ShortByteString 
Instance details

Defined in Data.Hashable.Class

Hashable ByteString 
Instance details

Defined in Data.Hashable.Class

Hashable ByteString 
Instance details

Defined in Data.Hashable.Class

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 Day 
Instance details

Defined in Chronos

Methods

hashWithSalt :: Int -> Day -> Int #

hash :: Day -> Int

Hashable DayOfWeek 
Instance details

Defined in Chronos

Methods

hashWithSalt :: Int -> DayOfWeek -> Int #

hash :: DayOfWeek -> Int

Hashable Time 
Instance details

Defined in Chronos

Methods

hashWithSalt :: Int -> Time -> Int #

hash :: Time -> Int

Hashable Value 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

hashWithSalt :: Int -> Value -> Int #

hash :: Value -> Int

Hashable Scientific 
Instance details

Defined in Data.Scientific

Methods

hashWithSalt :: Int -> Scientific -> Int #

hash :: Scientific -> Int

Hashable UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

hashWithSalt :: Int -> UUID -> Int #

hash :: UUID -> Int

Hashable a => Hashable [a] 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> [a] -> Int #

hash :: [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 (Ratio a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Ratio a -> Int #

hash :: Ratio a -> Int

Hashable (Ptr a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Ptr a -> Int #

hash :: Ptr a -> Int

Hashable (FunPtr a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> FunPtr a -> Int #

hash :: FunPtr 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 (Fixed a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Fixed a -> Int #

hash :: Fixed 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 (Max a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Max a -> Int #

hash :: Max 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 (WrappedMonoid a) 
Instance details

Defined in Data.Hashable.Class

Hashable a => Hashable (Option a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Option a -> Int #

hash :: Option a -> Int

Hashable (StableName a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> StableName a -> Int #

hash :: StableName 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 (NonEmpty a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> NonEmpty a -> Int #

hash :: NonEmpty 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 (HashSet a) 
Instance details

Defined in Data.HashSet.Base

Methods

hashWithSalt :: Int -> HashSet a -> Int #

hash :: HashSet a -> Int

Hashable (Hashed a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Hashed a -> Int #

hash :: Hashed a -> Int

Hashable s => Hashable (CI s) 
Instance details

Defined in Data.CaseInsensitive.Internal

Methods

hashWithSalt :: Int -> CI s -> Int #

hash :: CI s -> Int

(Hashable 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 (TypeRep a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> TypeRep a -> Int #

hash :: TypeRep a -> 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 b) => Hashable (Arg a b) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Arg a b -> Int #

hash :: Arg a b -> Int

Hashable (Proxy a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Proxy a -> Int #

hash :: Proxy a -> Int

(Hashable k, Hashable v) => Hashable (HashMap k v) 
Instance details

Defined in Data.HashMap.Base

Methods

hashWithSalt :: Int -> HashMap k v -> Int #

hash :: HashMap k v -> 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

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 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 (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 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

(Hashable1 f, Hashable1 g, Hashable a) => Hashable (Compose f g a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Compose f g a -> Int #

hash :: Compose f g a -> Int

(Hashable a1, Hashable a2, Hashable a3, Hashable a4, Hashable a5, Hashable a6) => Hashable (a1, a2, a3, a4, a5, a6) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> (a1, a2, a3, a4, a5, a6) -> Int #

hash :: (a1, a2, a3, a4, a5, a6) -> Int

(Hashable a1, Hashable a2, Hashable a3, Hashable a4, Hashable a5, Hashable a6, Hashable a7) => Hashable (a1, a2, a3, a4, a5, a6, a7) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> (a1, a2, a3, a4, a5, a6, a7) -> Int #

hash :: (a1, a2, a3, a4, a5, a6, a7) -> Int

class ToJSON a #

Instances
ToJSON Bool 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Bool -> Value

toEncoding :: Bool -> Encoding

toJSONList :: [Bool] -> Value

toEncodingList :: [Bool] -> Encoding

ToJSON Char 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Char -> Value

toEncoding :: Char -> Encoding

toJSONList :: [Char] -> Value

toEncodingList :: [Char] -> Encoding

ToJSON Double 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Double -> Value

toEncoding :: Double -> Encoding

toJSONList :: [Double] -> Value

toEncodingList :: [Double] -> Encoding

ToJSON Float 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Float -> Value

toEncoding :: Float -> Encoding

toJSONList :: [Float] -> Value

toEncodingList :: [Float] -> Encoding

ToJSON Int 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Int -> Value

toEncoding :: Int -> Encoding

toJSONList :: [Int] -> Value

toEncodingList :: [Int] -> Encoding

ToJSON Int8 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Int8 -> Value

toEncoding :: Int8 -> Encoding

toJSONList :: [Int8] -> Value

toEncodingList :: [Int8] -> Encoding

ToJSON Int16 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Int16 -> Value

toEncoding :: Int16 -> Encoding

toJSONList :: [Int16] -> Value

toEncodingList :: [Int16] -> Encoding

ToJSON Int32 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Int32 -> Value

toEncoding :: Int32 -> Encoding

toJSONList :: [Int32] -> Value

toEncodingList :: [Int32] -> Encoding

ToJSON Int64 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Int64 -> Value

toEncoding :: Int64 -> Encoding

toJSONList :: [Int64] -> Value

toEncodingList :: [Int64] -> Encoding

ToJSON Integer 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Integer -> Value

toEncoding :: Integer -> Encoding

toJSONList :: [Integer] -> Value

toEncodingList :: [Integer] -> Encoding

ToJSON Natural 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Natural -> Value

toEncoding :: Natural -> Encoding

toJSONList :: [Natural] -> Value

toEncodingList :: [Natural] -> Encoding

ToJSON Ordering 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Ordering -> Value

toEncoding :: Ordering -> Encoding

toJSONList :: [Ordering] -> Value

toEncodingList :: [Ordering] -> Encoding

ToJSON Word 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Word -> Value

toEncoding :: Word -> Encoding

toJSONList :: [Word] -> Value

toEncodingList :: [Word] -> Encoding

ToJSON Word8 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Word8 -> Value

toEncoding :: Word8 -> Encoding

toJSONList :: [Word8] -> Value

toEncodingList :: [Word8] -> Encoding

ToJSON Word16 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Word16 -> Value

toEncoding :: Word16 -> Encoding

toJSONList :: [Word16] -> Value

toEncodingList :: [Word16] -> Encoding

ToJSON Word32 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Word32 -> Value

toEncoding :: Word32 -> Encoding

toJSONList :: [Word32] -> Value

toEncodingList :: [Word32] -> Encoding

ToJSON Word64 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Word64 -> Value

toEncoding :: Word64 -> Encoding

toJSONList :: [Word64] -> Value

toEncodingList :: [Word64] -> Encoding

ToJSON () 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: () -> Value

toEncoding :: () -> Encoding

toJSONList :: [()] -> Value

toEncodingList :: [()] -> Encoding

ToJSON Void 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Void -> Value

toEncoding :: Void -> Encoding

toJSONList :: [Void] -> Value

toEncodingList :: [Void] -> Encoding

ToJSON Version 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Version -> Value

toEncoding :: Version -> Encoding

toJSONList :: [Version] -> Value

toEncodingList :: [Version] -> Encoding

ToJSON CTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: CTime -> Value

toEncoding :: CTime -> Encoding

toJSONList :: [CTime] -> Value

toEncodingList :: [CTime] -> Encoding

ToJSON IntSet 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: IntSet -> Value

toEncoding :: IntSet -> Encoding

toJSONList :: [IntSet] -> Value

toEncodingList :: [IntSet] -> Encoding

ToJSON Text 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Text -> Value

toEncoding :: Text -> Encoding

toJSONList :: [Text] -> Value

toEncodingList :: [Text] -> Encoding

ToJSON Text 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Text -> Value

toEncoding :: Text -> Encoding

toJSONList :: [Text] -> Value

toEncodingList :: [Text] -> Encoding

ToJSON ZonedTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: ZonedTime -> Value

toEncoding :: ZonedTime -> Encoding

toJSONList :: [ZonedTime] -> Value

toEncodingList :: [ZonedTime] -> Encoding

ToJSON LocalTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: LocalTime -> Value

toEncoding :: LocalTime -> Encoding

toJSONList :: [LocalTime] -> Value

toEncodingList :: [LocalTime] -> Encoding

ToJSON TimeOfDay 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: TimeOfDay -> Value

toEncoding :: TimeOfDay -> Encoding

toJSONList :: [TimeOfDay] -> Value

toEncodingList :: [TimeOfDay] -> Encoding

ToJSON UTCTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: UTCTime -> Value

toEncoding :: UTCTime -> Encoding

toJSONList :: [UTCTime] -> Value

toEncodingList :: [UTCTime] -> Encoding

ToJSON SystemTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: SystemTime -> Value

toEncoding :: SystemTime -> Encoding

toJSONList :: [SystemTime] -> Value

toEncodingList :: [SystemTime] -> Encoding

ToJSON NominalDiffTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: NominalDiffTime -> Value

toEncoding :: NominalDiffTime -> Encoding

toJSONList :: [NominalDiffTime] -> Value

toEncodingList :: [NominalDiffTime] -> Encoding

ToJSON DiffTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: DiffTime -> Value

toEncoding :: DiffTime -> Encoding

toJSONList :: [DiffTime] -> Value

toEncodingList :: [DiffTime] -> Encoding

ToJSON Day 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Day -> Value

toEncoding :: Day -> Encoding

toJSONList :: [Day] -> Value

toEncodingList :: [Day] -> Encoding

ToJSON Datetime 
Instance details

Defined in Chronos

Methods

toJSON :: Datetime -> Value

toEncoding :: Datetime -> Encoding

toJSONList :: [Datetime] -> Value

toEncodingList :: [Datetime] -> Encoding

ToJSON Day 
Instance details

Defined in Chronos

Methods

toJSON :: Day -> Value

toEncoding :: Day -> Encoding

toJSONList :: [Day] -> Value

toEncodingList :: [Day] -> Encoding

ToJSON Offset 
Instance details

Defined in Chronos

Methods

toJSON :: Offset -> Value

toEncoding :: Offset -> Encoding

toJSONList :: [Offset] -> Value

toEncodingList :: [Offset] -> Encoding

ToJSON Time 
Instance details

Defined in Chronos

Methods

toJSON :: Time -> Value

toEncoding :: Time -> Encoding

toJSONList :: [Time] -> Value

toEncodingList :: [Time] -> Encoding

ToJSON Timespan 
Instance details

Defined in Chronos

Methods

toJSON :: Timespan -> Value

toEncoding :: Timespan -> Encoding

toJSONList :: [Timespan] -> Value

toEncodingList :: [Timespan] -> Encoding

ToJSON Value 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Value -> Value

toEncoding :: Value -> Encoding

toJSONList :: [Value] -> Value

toEncodingList :: [Value] -> Encoding

ToJSON DotNetTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: DotNetTime -> Value

toEncoding :: DotNetTime -> Encoding

toJSONList :: [DotNetTime] -> Value

toEncodingList :: [DotNetTime] -> Encoding

ToJSON PersistValue 
Instance details

Defined in Database.Persist.Types.Base

Methods

toJSON :: PersistValue -> Value

toEncoding :: PersistValue -> Encoding

toJSONList :: [PersistValue] -> Value

toEncodingList :: [PersistValue] -> Encoding

ToJSON Environment 
Instance details

Defined in Katip.Core

Methods

toJSON :: Environment -> Value

toEncoding :: Environment -> Encoding

toJSONList :: [Environment] -> Value

toEncodingList :: [Environment] -> Encoding

ToJSON Namespace 
Instance details

Defined in Katip.Core

Methods

toJSON :: Namespace -> Value

toEncoding :: Namespace -> Encoding

toJSONList :: [Namespace] -> Value

toEncodingList :: [Namespace] -> Encoding

ToJSON Severity 
Instance details

Defined in Katip.Core

Methods

toJSON :: Severity -> Value

toEncoding :: Severity -> Encoding

toJSONList :: [Severity] -> Value

toEncodingList :: [Severity] -> Encoding

ToJSON SimpleLogPayload 
Instance details

Defined in Katip.Core

Methods

toJSON :: SimpleLogPayload -> Value

toEncoding :: SimpleLogPayload -> Encoding

toJSONList :: [SimpleLogPayload] -> Value

toEncodingList :: [SimpleLogPayload] -> Encoding

ToJSON ThreadIdText 
Instance details

Defined in Katip.Core

Methods

toJSON :: ThreadIdText -> Value

toEncoding :: ThreadIdText -> Encoding

toJSONList :: [ThreadIdText] -> Value

toEncodingList :: [ThreadIdText] -> Encoding

ToJSON Verbosity 
Instance details

Defined in Katip.Core

Methods

toJSON :: Verbosity -> Value

toEncoding :: Verbosity -> Encoding

toJSONList :: [Verbosity] -> Value

toEncodingList :: [Verbosity] -> Encoding

ToJSON LogContexts 
Instance details

Defined in Katip.Monadic

Methods

toJSON :: LogContexts -> Value

toEncoding :: LogContexts -> Encoding

toJSONList :: [LogContexts] -> Value

toEncodingList :: [LogContexts] -> Encoding

ToJSON Number 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Number -> Value

toEncoding :: Number -> Encoding

toJSONList :: [Number] -> Value

toEncodingList :: [Number] -> Encoding

ToJSON Scientific 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Scientific -> Value

toEncoding :: Scientific -> Encoding

toJSONList :: [Scientific] -> Value

toEncodingList :: [Scientific] -> Encoding

ToJSON LocJs 
Instance details

Defined in Katip.Core

Methods

toJSON :: LocJs -> Value

toEncoding :: LocJs -> Encoding

toJSONList :: [LocJs] -> Value

toEncodingList :: [LocJs] -> Encoding

ToJSON ProcessIDJs 
Instance details

Defined in Katip.Core

Methods

toJSON :: ProcessIDJs -> Value

toEncoding :: ProcessIDJs -> Encoding

toJSONList :: [ProcessIDJs] -> Value

toEncodingList :: [ProcessIDJs] -> Encoding

ToJSON UUID 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: UUID -> Value

toEncoding :: UUID -> Encoding

toJSONList :: [UUID] -> Value

toEncodingList :: [UUID] -> Encoding

ToJSON CalendarDiffDays 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: CalendarDiffDays -> Value

toEncoding :: CalendarDiffDays -> Encoding

toJSONList :: [CalendarDiffDays] -> Value

toEncodingList :: [CalendarDiffDays] -> Encoding

ToJSON CalendarDiffTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: CalendarDiffTime -> Value

toEncoding :: CalendarDiffTime -> Encoding

toJSONList :: [CalendarDiffTime] -> Value

toEncodingList :: [CalendarDiffTime] -> Encoding

ToJSON DayOfWeek 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: DayOfWeek -> Value

toEncoding :: DayOfWeek -> Encoding

toJSONList :: [DayOfWeek] -> Value

toEncodingList :: [DayOfWeek] -> Encoding

ToJSON RpcName Source # 
Instance details

Defined in LndClient.RPC.Generic

Methods

toJSON :: RpcName -> Value

toEncoding :: RpcName -> Encoding

toJSONList :: [RpcName] -> Value

toEncodingList :: [RpcName] -> Encoding

ToJSON HashData 
Instance details

Defined in Network.Bitcoin.Mining

Methods

toJSON :: HashData -> Value

toEncoding :: HashData -> Encoding

toJSONList :: [HashData] -> Value

toEncodingList :: [HashData] -> Encoding

ToJSON AddrAddress 
Instance details

Defined in Network.Bitcoin.Internal

Methods

toJSON :: AddrAddress -> Value

toEncoding :: AddrAddress -> Encoding

toJSONList :: [AddrAddress] -> Value

toEncodingList :: [AddrAddress] -> 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 (Maybe a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Maybe a -> Value

toEncoding :: Maybe a -> Encoding

toJSONList :: [Maybe a] -> Value

toEncodingList :: [Maybe a] -> Encoding

(ToJSON a, Integral a) => ToJSON (Ratio a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Ratio a -> Value

toEncoding :: Ratio a -> Encoding

toJSONList :: [Ratio a] -> Value

toEncodingList :: [Ratio a] -> Encoding

HasResolution a => ToJSON (Fixed a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Fixed a -> Value

toEncoding :: Fixed a -> Encoding

toJSONList :: [Fixed a] -> Value

toEncodingList :: [Fixed 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 (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 (First a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: First a -> Value

toEncoding :: First a -> Encoding

toJSONList :: [First a] -> Value

toEncodingList :: [First a] -> Encoding

ToJSON a => ToJSON (Last a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Last a -> Value

toEncoding :: Last a -> Encoding

toJSONList :: [Last a] -> Value

toEncodingList :: [Last a] -> Encoding

ToJSON a => ToJSON (WrappedMonoid a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: WrappedMonoid a -> Value

toEncoding :: WrappedMonoid a -> Encoding

toJSONList :: [WrappedMonoid a] -> Value

toEncodingList :: [WrappedMonoid a] -> Encoding

ToJSON a => ToJSON (Option a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Option a -> Value

toEncoding :: Option a -> Encoding

toJSONList :: [Option a] -> Value

toEncodingList :: [Option a] -> Encoding

ToJSON a => ToJSON (Identity a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Identity a -> Value

toEncoding :: Identity a -> Encoding

toJSONList :: [Identity a] -> Value

toEncodingList :: [Identity a] -> Encoding

ToJSON a => ToJSON (First a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: First a -> Value

toEncoding :: First a -> Encoding

toJSONList :: [First a] -> Value

toEncodingList :: [First a] -> Encoding

ToJSON a => ToJSON (Last a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Last a -> Value

toEncoding :: Last a -> Encoding

toJSONList :: [Last a] -> Value

toEncodingList :: [Last a] -> Encoding

ToJSON a => ToJSON (Dual a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Dual a -> Value

toEncoding :: Dual a -> Encoding

toJSONList :: [Dual a] -> Value

toEncodingList :: [Dual a] -> Encoding

ToJSON a => ToJSON (NonEmpty a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: NonEmpty a -> Value

toEncoding :: NonEmpty a -> Encoding

toJSONList :: [NonEmpty a] -> Value

toEncodingList :: [NonEmpty a] -> Encoding

ToJSON a => ToJSON (IntMap a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: IntMap a -> Value

toEncoding :: IntMap a -> Encoding

toJSONList :: [IntMap a] -> Value

toEncodingList :: [IntMap a] -> Encoding

ToJSON v => ToJSON (Tree v) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Tree v -> Value

toEncoding :: Tree v -> Encoding

toJSONList :: [Tree v] -> Value

toEncodingList :: [Tree v] -> Encoding

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 a => ToJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Vector a -> Value

toEncoding :: Vector a -> Encoding

toJSONList :: [Vector a] -> Value

toEncodingList :: [Vector a] -> Encoding

(Vector Vector a, ToJSON a) => ToJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Vector a -> Value

toEncoding :: Vector a -> Encoding

toJSONList :: [Vector a] -> Value

toEncodingList :: [Vector a] -> Encoding

(Prim a, ToJSON a) => ToJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Vector a -> Value

toEncoding :: Vector a -> Encoding

toJSONList :: [Vector a] -> Value

toEncodingList :: [Vector a] -> Encoding

ToJSON a => ToJSON (Item a) 
Instance details

Defined in Katip.Core

Methods

toJSON :: Item a -> Value

toEncoding :: Item a -> Encoding

toJSONList :: [Item a] -> Value

toEncodingList :: [Item a] -> Encoding

ToJSON a => ToJSON (HashSet a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: HashSet a -> Value

toEncoding :: HashSet a -> Encoding

toJSONList :: [HashSet a] -> Value

toEncodingList :: [HashSet a] -> Encoding

ToJSON a => ToJSON (DList a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: DList a -> Value

toEncoding :: DList a -> Encoding

toJSONList :: [DList a] -> Value

toEncodingList :: [DList a] -> Encoding

(Storable a, ToJSON a) => ToJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Vector a -> Value

toEncoding :: Vector a -> Encoding

toJSONList :: [Vector a] -> Value

toEncodingList :: [Vector a] -> Encoding

ToJSON a => ToJSON (Array a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Array a -> Value

toEncoding :: Array a -> Encoding

toJSONList :: [Array a] -> Value

toEncodingList :: [Array a] -> Encoding

(Prim a, ToJSON a) => ToJSON (PrimArray a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: PrimArray a -> Value

toEncoding :: PrimArray a -> Encoding

toJSONList :: [PrimArray a] -> Value

toEncodingList :: [PrimArray a] -> Encoding

ToJSON a => ToJSON (SmallArray a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: SmallArray a -> Value

toEncoding :: SmallArray a -> Encoding

toJSONList :: [SmallArray a] -> Value

toEncodingList :: [SmallArray a] -> Encoding

(PrimUnlifted a, ToJSON a) => ToJSON (UnliftedArray a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: UnliftedArray a -> Value

toEncoding :: UnliftedArray a -> Encoding

toJSONList :: [UnliftedArray a] -> Value

toEncodingList :: [UnliftedArray 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

(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 (Proxy a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Proxy a -> Value

toEncoding :: Proxy a -> Encoding

toJSONList :: [Proxy a] -> Value

toEncodingList :: [Proxy a] -> Encoding

(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 v, ToJSONKey k) => ToJSON (HashMap k v) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: HashMap k v -> Value

toEncoding :: HashMap k v -> Encoding

toJSONList :: [HashMap k v] -> Value

toEncodingList :: [HashMap k v] -> 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

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

(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 (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 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

(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 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

async :: IO a -> IO (Async a) #

cancel :: Async a -> IO () #

link :: Async a -> IO () #

wait :: Async a -> IO a #

waitAnySTM :: [Async a] -> STM (Async a, a) #

withAsync :: IO a -> (Async a -> IO b) -> IO b #

data Async a #

Instances
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

delay :: Integer -> IO () #

fromMaybeM :: Monad m => m a -> m (Maybe a) -> m a #

fromJSON :: FromJSON a => Value -> Result a #

enumerate :: (Enum a, Bounded a) => [a] #

class PersistField a #

Minimal complete definition

toPersistValue, fromPersistValue

Instances
PersistField Bool 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Bool -> PersistValue

fromPersistValue :: PersistValue -> Either Text Bool

PersistField Double 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Double -> PersistValue

fromPersistValue :: PersistValue -> Either Text Double

PersistField Int 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Int -> PersistValue

fromPersistValue :: PersistValue -> Either Text Int

PersistField Int8 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Int8 -> PersistValue

fromPersistValue :: PersistValue -> Either Text Int8

PersistField Int16 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Int16 -> PersistValue

fromPersistValue :: PersistValue -> Either Text Int16

PersistField Int32 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Int32 -> PersistValue

fromPersistValue :: PersistValue -> Either Text Int32

PersistField Int64 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Int64 -> PersistValue

fromPersistValue :: PersistValue -> Either Text Int64

(TypeError (((((Text "The instance of PersistField for the Natural type was removed." :$$: Text "Please see the documentation for OverflowNatural if you want to ") :$$: Text "continue using the old behavior or want to see documentation on ") :$$: Text "why the instance was removed.") :$$: Text "") :$$: Text "This error instance will be removed in a future release.") :: Constraint) => PersistField Natural 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Natural -> PersistValue

fromPersistValue :: PersistValue -> Either Text Natural

PersistField Rational 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Rational -> PersistValue

fromPersistValue :: PersistValue -> Either Text Rational

PersistField Word 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Word -> PersistValue

fromPersistValue :: PersistValue -> Either Text Word

PersistField Word8 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Word8 -> PersistValue

fromPersistValue :: PersistValue -> Either Text Word8

PersistField Word16 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Word16 -> PersistValue

fromPersistValue :: PersistValue -> Either Text Word16

PersistField Word32 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Word32 -> PersistValue

fromPersistValue :: PersistValue -> Either Text Word32

PersistField Word64 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Word64 -> PersistValue

fromPersistValue :: PersistValue -> Either Text Word64

PersistField ByteString 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: ByteString -> PersistValue

fromPersistValue :: PersistValue -> Either Text ByteString

PersistField Text 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Text -> PersistValue

fromPersistValue :: PersistValue -> Either Text0 Text

PersistField Text 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Text -> PersistValue

fromPersistValue :: PersistValue -> Either Text Text

PersistField TimeOfDay 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: TimeOfDay -> PersistValue

fromPersistValue :: PersistValue -> Either Text TimeOfDay

PersistField UTCTime 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: UTCTime -> PersistValue

fromPersistValue :: PersistValue -> Either Text UTCTime

PersistField Day 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Day -> PersistValue

fromPersistValue :: PersistValue -> Either Text Day

PersistField OverflowNatural 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: OverflowNatural -> PersistValue

fromPersistValue :: PersistValue -> Either Text OverflowNatural

PersistField SomePersistField 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: SomePersistField -> PersistValue

fromPersistValue :: PersistValue -> Either Text SomePersistField

PersistField Checkmark 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Checkmark -> PersistValue

fromPersistValue :: PersistValue -> Either Text Checkmark

PersistField PersistValue 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: PersistValue -> PersistValue

fromPersistValue :: PersistValue -> Either Text PersistValue

PersistField Html 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Html -> PersistValue

fromPersistValue :: PersistValue -> Either Text Html

PersistField QRPngDataUrl Source # 
Instance details

Defined in LndClient.QRCode

Methods

toPersistValue :: QRPngDataUrl -> PersistValue

fromPersistValue :: PersistValue -> Either Text QRPngDataUrl

PersistField Seconds Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

toPersistValue :: Seconds -> PersistValue

fromPersistValue :: PersistValue -> Either Text Seconds

PersistField AezeedPassphrase Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

toPersistValue :: AezeedPassphrase -> PersistValue

fromPersistValue :: PersistValue -> Either Text AezeedPassphrase

PersistField CipherSeedMnemonic Source # 
Instance details

Defined in LndClient.Data.Newtype

PersistField MSat Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

toPersistValue :: MSat -> PersistValue

fromPersistValue :: PersistValue -> Either Text MSat

PersistField RPreimage Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

toPersistValue :: RPreimage -> PersistValue

fromPersistValue :: PersistValue -> Either Text RPreimage

PersistField RHash Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

toPersistValue :: RHash -> PersistValue

fromPersistValue :: PersistValue -> Either Text RHash

PersistField PaymentRequest Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

toPersistValue :: PaymentRequest -> PersistValue

fromPersistValue :: PersistValue -> Either Text PaymentRequest

PersistField SettleIndex Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

toPersistValue :: SettleIndex -> PersistValue

fromPersistValue :: PersistValue -> Either Text SettleIndex

PersistField AddIndex Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

toPersistValue :: AddIndex -> PersistValue

fromPersistValue :: PersistValue -> Either Text AddIndex

PersistField NodeLocation Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

toPersistValue :: NodeLocation -> PersistValue

fromPersistValue :: PersistValue -> Either Text NodeLocation

PersistField NodePubKey Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

toPersistValue :: NodePubKey -> PersistValue

fromPersistValue :: PersistValue -> Either Text NodePubKey

PersistField LndPort Source # 
Instance details

Defined in LndClient.Data.LndEnv

Methods

toPersistValue :: LndPort -> PersistValue

fromPersistValue :: PersistValue -> Either Text LndPort

PersistField LndHost Source # 
Instance details

Defined in LndClient.Data.LndEnv

Methods

toPersistValue :: LndHost -> PersistValue

fromPersistValue :: PersistValue -> Either Text LndHost

PersistField LndHexMacaroon Source # 
Instance details

Defined in LndClient.Data.LndEnv

Methods

toPersistValue :: LndHexMacaroon -> PersistValue

fromPersistValue :: PersistValue -> Either Text LndHexMacaroon

PersistField LndTlsCert Source # 
Instance details

Defined in LndClient.Data.LndEnv

Methods

toPersistValue :: LndTlsCert -> PersistValue

fromPersistValue :: PersistValue -> Either Text LndTlsCert

PersistField LndWalletPassword Source # 
Instance details

Defined in LndClient.Data.LndEnv

PersistField [Char] 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: [Char] -> PersistValue

fromPersistValue :: PersistValue -> Either Text [Char]

PersistField a => PersistField [a] 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: [a] -> PersistValue

fromPersistValue :: PersistValue -> Either Text [a]

PersistField a => PersistField (Maybe a) 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Maybe a -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Maybe a)

HasResolution a => PersistField (Fixed a) 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Fixed a -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Fixed a)

PersistField v => PersistField (IntMap v) 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: IntMap v -> PersistValue

fromPersistValue :: PersistValue -> Either Text (IntMap v)

(Ord a, PersistField a) => PersistField (Set a) 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Set a -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Set a)

PersistField a => PersistField (Vector a) 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Vector a -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Vector a)

(PersistEntity record, PersistField record, PersistField (Key record)) => PersistField (Entity record) 
Instance details

Defined in Database.Persist.Class.PersistEntity

Methods

toPersistValue :: Entity record -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Entity record)

PersistField (TxId a) Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

toPersistValue :: TxId a -> PersistValue

fromPersistValue :: PersistValue -> Either Text (TxId a)

PersistField (Vout a) Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

toPersistValue :: Vout a -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Vout a)

(PersistField a, PersistField b) => PersistField (a, b) 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: (a, b) -> PersistValue

fromPersistValue :: PersistValue -> Either Text (a, b)

PersistField v => PersistField (Map Text v) 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Map Text v -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Map Text v)

class PersistField a => PersistFieldSql a #

Minimal complete definition

sqlType

Instances
PersistFieldSql Bool 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Bool -> SqlType

PersistFieldSql Double 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Double -> SqlType

PersistFieldSql Int 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Int -> SqlType

PersistFieldSql Int8 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Int8 -> SqlType

PersistFieldSql Int16 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Int16 -> SqlType

PersistFieldSql Int32 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Int32 -> SqlType

PersistFieldSql Int64 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Int64 -> SqlType

PersistFieldSql Rational 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Rational -> SqlType

PersistFieldSql Word 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Word -> SqlType

PersistFieldSql Word8 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Word8 -> SqlType

PersistFieldSql Word16 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Word16 -> SqlType

PersistFieldSql Word32 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Word32 -> SqlType

PersistFieldSql Word64 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Word64 -> SqlType

PersistFieldSql ByteString 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy ByteString -> SqlType

PersistFieldSql Text 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Text -> SqlType

PersistFieldSql Text 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Text -> SqlType

PersistFieldSql TimeOfDay 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy TimeOfDay -> SqlType

PersistFieldSql UTCTime 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy UTCTime -> SqlType

PersistFieldSql Day 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Day -> SqlType

PersistFieldSql OverflowNatural 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy OverflowNatural -> SqlType

PersistFieldSql Checkmark 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Checkmark -> SqlType

PersistFieldSql PersistValue 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy PersistValue -> SqlType

PersistFieldSql Html 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Html -> SqlType

PersistFieldSql QRPngDataUrl Source # 
Instance details

Defined in LndClient.QRCode

Methods

sqlType :: Proxy QRPngDataUrl -> SqlType

PersistFieldSql Seconds Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

sqlType :: Proxy Seconds -> SqlType

PersistFieldSql AezeedPassphrase Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

sqlType :: Proxy AezeedPassphrase -> SqlType

PersistFieldSql CipherSeedMnemonic Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

sqlType :: Proxy CipherSeedMnemonic -> SqlType

PersistFieldSql MSat Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

sqlType :: Proxy MSat -> SqlType

PersistFieldSql RPreimage Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

sqlType :: Proxy RPreimage -> SqlType

PersistFieldSql RHash Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

sqlType :: Proxy RHash -> SqlType

PersistFieldSql PaymentRequest Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

sqlType :: Proxy PaymentRequest -> SqlType

PersistFieldSql SettleIndex Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

sqlType :: Proxy SettleIndex -> SqlType

PersistFieldSql AddIndex Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

sqlType :: Proxy AddIndex -> SqlType

PersistFieldSql NodeLocation Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

sqlType :: Proxy NodeLocation -> SqlType

PersistFieldSql NodePubKey Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

sqlType :: Proxy NodePubKey -> SqlType

PersistFieldSql LndPort Source # 
Instance details

Defined in LndClient.Data.LndEnv

Methods

sqlType :: Proxy LndPort -> SqlType

PersistFieldSql LndHost Source # 
Instance details

Defined in LndClient.Data.LndEnv

Methods

sqlType :: Proxy LndHost -> SqlType

PersistFieldSql LndHexMacaroon Source # 
Instance details

Defined in LndClient.Data.LndEnv

Methods

sqlType :: Proxy LndHexMacaroon -> SqlType

PersistFieldSql LndTlsCert Source # 
Instance details

Defined in LndClient.Data.LndEnv

Methods

sqlType :: Proxy LndTlsCert -> SqlType

PersistFieldSql LndWalletPassword Source # 
Instance details

Defined in LndClient.Data.LndEnv

Methods

sqlType :: Proxy LndWalletPassword -> SqlType

PersistFieldSql [Char] 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy [Char] -> SqlType

PersistFieldSql a => PersistFieldSql [a] 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy [a] -> SqlType

HasResolution a => PersistFieldSql (Fixed a) 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy (Fixed a) -> SqlType

PersistFieldSql v => PersistFieldSql (IntMap v) 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy (IntMap v) -> SqlType

(Ord a, PersistFieldSql a) => PersistFieldSql (Set a) 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy (Set a) -> SqlType

PersistFieldSql a => PersistFieldSql (Vector a) 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy (Vector a) -> SqlType

(PersistField record, PersistEntity record) => PersistFieldSql (Entity record) 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy (Entity record) -> SqlType

PersistFieldSql (TxId a) Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

sqlType :: Proxy (TxId a) -> SqlType

PersistFieldSql (Vout a) Source # 
Instance details

Defined in LndClient.Data.Newtype

Methods

sqlType :: Proxy (Vout a) -> SqlType

(PersistFieldSql a, PersistFieldSql b) => PersistFieldSql (a, b) 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy (a, b) -> SqlType

PersistFieldSql v => PersistFieldSql (Map Text v) 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy (Map Text v) -> SqlType

defaultScribeSettings :: ScribeSettings #

initLogEnv :: Namespace -> Environment -> IO LogEnv #

logStr :: StringConv a Text => a -> LogStr #

permitItem :: Monad m => Severity -> Item a -> m Bool #

registerScribe :: Text -> Scribe -> ScribeSettings -> LogEnv -> IO LogEnv #

sl :: ToJSON a => Text -> a -> SimpleLogPayload #

katipAddContext :: (LogItem i, KatipContext m) => i -> m a -> m a #

runKatipContextT :: LogItem c => LogEnv -> c -> Namespace -> KatipContextT m a -> m a #

bracketFormat :: LogItem a => ItemFormatter a #

jsonFormat :: LogItem a => ItemFormatter a #

mkHandleScribeWithFormatter :: (forall a. LogItem a => ItemFormatter a) -> ColorStrategy -> Handle -> PermitFunc -> Verbosity -> IO Scribe #

class MonadIO m => Katip (m :: Type -> Type) where #

Methods

getLogEnv :: m LogEnv #

localLogEnv :: (LogEnv -> LogEnv) -> m a -> m a #

Instances
Katip m => Katip (MaybeT m) 
Instance details

Defined in Katip.Core

Methods

getLogEnv :: MaybeT m LogEnv #

localLogEnv :: (LogEnv -> LogEnv) -> MaybeT m a -> MaybeT m a #

MonadIO m => Katip (KatipT m) 
Instance details

Defined in Katip.Core

Methods

getLogEnv :: KatipT m LogEnv #

localLogEnv :: (LogEnv -> LogEnv) -> KatipT m a -> KatipT m a #

MonadIO m => Katip (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Katip m => Katip (ResourceT m) 
Instance details

Defined in Katip.Core

Methods

getLogEnv :: ResourceT m LogEnv #

localLogEnv :: (LogEnv -> LogEnv) -> ResourceT m a -> ResourceT m a #

MonadIO m => Katip (NoLoggingT m) 
Instance details

Defined in Katip.Monadic

Methods

getLogEnv :: NoLoggingT m LogEnv #

localLogEnv :: (LogEnv -> LogEnv) -> NoLoggingT m a -> NoLoggingT m a #

Katip m => Katip (ExceptT s m) 
Instance details

Defined in Katip.Core

Methods

getLogEnv :: ExceptT s m LogEnv #

localLogEnv :: (LogEnv -> LogEnv) -> ExceptT s m a -> ExceptT s m a #

Katip m => Katip (ReaderT s m) 
Instance details

Defined in Katip.Core

Methods

getLogEnv :: ReaderT s m LogEnv #

localLogEnv :: (LogEnv -> LogEnv) -> ReaderT s m a -> ReaderT s m a #

Katip m => Katip (StateT s m) 
Instance details

Defined in Katip.Core

Methods

getLogEnv :: StateT s m LogEnv #

localLogEnv :: (LogEnv -> LogEnv) -> StateT s m a -> StateT s m a #

Katip m => Katip (StateT s m) 
Instance details

Defined in Katip.Core

Methods

getLogEnv :: StateT s m LogEnv #

localLogEnv :: (LogEnv -> LogEnv) -> StateT s m a -> StateT s m a #

(Katip m, Monoid s) => Katip (WriterT s m) 
Instance details

Defined in Katip.Core

Methods

getLogEnv :: WriterT s m LogEnv #

localLogEnv :: (LogEnv -> LogEnv) -> WriterT s m a -> WriterT s m a #

(Katip m, Monoid s) => Katip (WriterT s m) 
Instance details

Defined in Katip.Core

Methods

getLogEnv :: WriterT s m LogEnv #

localLogEnv :: (LogEnv -> LogEnv) -> WriterT s m a -> WriterT s m a #

(Katip m, Monoid w) => Katip (RWST r w s m) 
Instance details

Defined in Katip.Core

Methods

getLogEnv :: RWST r w s m LogEnv #

localLogEnv :: (LogEnv -> LogEnv) -> RWST r w s m a -> RWST r w s m a #

(Katip m, Monoid w) => Katip (RWST r w s m) 
Instance details

Defined in Katip.Core

Methods

getLogEnv :: RWST r w s m LogEnv #

localLogEnv :: (LogEnv -> LogEnv) -> RWST r w s m a -> RWST r w s m a #

data LogEnv #

Constructors

LogEnv 

Fields

data Namespace #

Instances
Eq Namespace 
Instance details

Defined in Katip.Core

Ord Namespace 
Instance details

Defined in Katip.Core

Read Namespace 
Instance details

Defined in Katip.Core

Show Namespace 
Instance details

Defined in Katip.Core

IsString Namespace 
Instance details

Defined in Katip.Core

Generic Namespace 
Instance details

Defined in Katip.Core

Associated Types

type Rep Namespace :: Type -> Type #

Semigroup Namespace 
Instance details

Defined in Katip.Core

Monoid Namespace 
Instance details

Defined in Katip.Core

Lift Namespace 
Instance details

Defined in Katip.Core

Methods

lift :: Namespace -> Q Exp #

FromJSON Namespace 
Instance details

Defined in Katip.Core

Methods

parseJSON :: Value -> Parser Namespace #

parseJSONList :: Value -> Parser [Namespace] #

ToJSON Namespace 
Instance details

Defined in Katip.Core

Methods

toJSON :: Namespace -> Value

toEncoding :: Namespace -> Encoding

toJSONList :: [Namespace] -> Value

toEncodingList :: [Namespace] -> Encoding

type Rep Namespace 
Instance details

Defined in Katip.Core

type Rep Namespace = D1 (MetaData "Namespace" "Katip.Core" "katip-0.8.3.0-bff45ac06278167c570c072ba5c7493190e234092b506661569f7784fd56e2c7" True) (C1 (MetaCons "Namespace" PrefixI True) (S1 (MetaSel (Just "unNamespace") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Text])))

data Severity #

Instances
Bounded Severity 
Instance details

Defined in Katip.Core

Enum Severity 
Instance details

Defined in Katip.Core

Eq Severity 
Instance details

Defined in Katip.Core

Ord Severity 
Instance details

Defined in Katip.Core

Read Severity 
Instance details

Defined in Katip.Core

Show Severity 
Instance details

Defined in Katip.Core

Generic Severity 
Instance details

Defined in Katip.Core

Associated Types

type Rep Severity :: Type -> Type #

Methods

from :: Severity -> Rep Severity x #

to :: Rep Severity x -> Severity #

Lift Severity 
Instance details

Defined in Katip.Core

Methods

lift :: Severity -> Q Exp #

FromJSON Severity 
Instance details

Defined in Katip.Core

Methods

parseJSON :: Value -> Parser Severity #

parseJSONList :: Value -> Parser [Severity] #

ToJSON Severity 
Instance details

Defined in Katip.Core

Methods

toJSON :: Severity -> Value

toEncoding :: Severity -> Encoding

toJSONList :: [Severity] -> Value

toEncodingList :: [Severity] -> Encoding

type Rep Severity 
Instance details

Defined in Katip.Core

type Rep Severity = D1 (MetaData "Severity" "Katip.Core" "katip-0.8.3.0-bff45ac06278167c570c072ba5c7493190e234092b506661569f7784fd56e2c7" False) (((C1 (MetaCons "DebugS" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "InfoS" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "NoticeS" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "WarningS" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "ErrorS" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "CriticalS" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "AlertS" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "EmergencyS" PrefixI False) (U1 :: Type -> Type))))

data Verbosity #

Constructors

V0 
V1 
V2 
V3 
Instances
Bounded Verbosity 
Instance details

Defined in Katip.Core

Enum Verbosity 
Instance details

Defined in Katip.Core

Eq Verbosity 
Instance details

Defined in Katip.Core

Ord Verbosity 
Instance details

Defined in Katip.Core

Read Verbosity 
Instance details

Defined in Katip.Core

Show Verbosity 
Instance details

Defined in Katip.Core

Generic Verbosity 
Instance details

Defined in Katip.Core

Associated Types

type Rep Verbosity :: Type -> Type #

Lift Verbosity 
Instance details

Defined in Katip.Core

Methods

lift :: Verbosity -> Q Exp #

FromJSON Verbosity 
Instance details

Defined in Katip.Core

Methods

parseJSON :: Value -> Parser Verbosity #

parseJSONList :: Value -> Parser [Verbosity] #

ToJSON Verbosity 
Instance details

Defined in Katip.Core

Methods

toJSON :: Verbosity -> Value

toEncoding :: Verbosity -> Encoding

toJSONList :: [Verbosity] -> Value

toEncodingList :: [Verbosity] -> Encoding

type Rep Verbosity 
Instance details

Defined in Katip.Core

type Rep Verbosity = D1 (MetaData "Verbosity" "Katip.Core" "katip-0.8.3.0-bff45ac06278167c570c072ba5c7493190e234092b506661569f7784fd56e2c7" False) ((C1 (MetaCons "V0" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "V1" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "V2" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "V3" PrefixI False) (U1 :: Type -> Type)))

class Katip m => KatipContext (m :: Type -> Type) where #

Instances
(KatipContext m, Katip (MaybeT m)) => KatipContext (MaybeT m) 
Instance details

Defined in Katip.Monadic

(Monad m, KatipContext m) => KatipContext (KatipT m) 
Instance details

Defined in Katip.Monadic

Methods

getKatipContext :: KatipT m LogContexts #

localKatipContext :: (LogContexts -> LogContexts) -> KatipT m a -> KatipT m a #

getKatipNamespace :: KatipT m Namespace #

localKatipNamespace :: (Namespace -> Namespace) -> KatipT m a -> KatipT m a #

MonadIO m => KatipContext (KatipContextT m) 
Instance details

Defined in Katip.Monadic

(KatipContext m, Katip (ResourceT m)) => KatipContext (ResourceT m) 
Instance details

Defined in Katip.Monadic

Methods

getKatipContext :: ResourceT m LogContexts #

localKatipContext :: (LogContexts -> LogContexts) -> ResourceT m a -> ResourceT m a #

getKatipNamespace :: ResourceT m Namespace #

localKatipNamespace :: (Namespace -> Namespace) -> ResourceT m a -> ResourceT m a #

MonadIO m => KatipContext (NoLoggingT m) 
Instance details

Defined in Katip.Monadic

Methods

getKatipContext :: NoLoggingT m LogContexts #

localKatipContext :: (LogContexts -> LogContexts) -> NoLoggingT m a -> NoLoggingT m a #

getKatipNamespace :: NoLoggingT m Namespace #

localKatipNamespace :: (Namespace -> Namespace) -> NoLoggingT m a -> NoLoggingT m a #

(KatipContext m, Katip (IdentityT m)) => KatipContext (IdentityT m) 
Instance details

Defined in Katip.Monadic

(KatipContext m, Katip (ExceptT e m)) => KatipContext (ExceptT e m) 
Instance details

Defined in Katip.Monadic

(KatipContext m, Katip (ReaderT r m)) => KatipContext (ReaderT r m) 
Instance details

Defined in Katip.Monadic

(KatipContext m, Katip (StateT s m)) => KatipContext (StateT s m) 
Instance details

Defined in Katip.Monadic

(KatipContext m, Katip (StateT s m)) => KatipContext (StateT s m) 
Instance details

Defined in Katip.Monadic

(Monoid w, KatipContext m, Katip (WriterT w m)) => KatipContext (WriterT w m) 
Instance details

Defined in Katip.Monadic

(Monoid w, KatipContext m, Katip (WriterT w m)) => KatipContext (WriterT w m) 
Instance details

Defined in Katip.Monadic

(Monoid w, KatipContext m, Katip (RWST r w s m)) => KatipContext (RWST r w s m) 
Instance details

Defined in Katip.Monadic

Methods

getKatipContext :: RWST r w s m LogContexts #

localKatipContext :: (LogContexts -> LogContexts) -> RWST r w s m a -> RWST r w s m a #

getKatipNamespace :: RWST r w s m Namespace #

localKatipNamespace :: (Namespace -> Namespace) -> RWST r w s m a -> RWST r w s m a #

(Monoid w, KatipContext m, Katip (RWST r w s m)) => KatipContext (RWST r w s m) 
Instance details

Defined in Katip.Monadic

Methods

getKatipContext :: RWST r w s m LogContexts #

localKatipContext :: (LogContexts -> LogContexts) -> RWST r w s m a -> RWST r w s m a #

getKatipNamespace :: RWST r w s m Namespace #

localKatipNamespace :: (Namespace -> Namespace) -> RWST r w s m a -> RWST r w s m a #

data KatipContextT (m :: Type -> Type) a #

Instances
MonadTrans KatipContextT 
Instance details

Defined in Katip.Monadic

Methods

lift :: Monad m => m a -> KatipContextT m a #

MonadTransControl KatipContextT 
Instance details

Defined in Katip.Monadic

Associated Types

type StT KatipContextT a :: Type

Methods

liftWith :: Monad m => (Run KatipContextT -> m a) -> KatipContextT m a

restoreT :: Monad m => m (StT KatipContextT a) -> KatipContextT m a

MonadWriter w m => MonadWriter w (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

writer :: (a, w) -> KatipContextT m a #

tell :: w -> KatipContextT m () #

listen :: KatipContextT m a -> KatipContextT m (a, w) #

pass :: KatipContextT m (a, w -> w) -> KatipContextT m a #

MonadState s m => MonadState s (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

get :: KatipContextT m s #

put :: s -> KatipContextT m () #

state :: (s -> (a, s)) -> KatipContextT m a #

MonadReader r m => MonadReader r (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

ask :: KatipContextT m r #

local :: (r -> r) -> KatipContextT m a -> KatipContextT m a #

reader :: (r -> a) -> KatipContextT m a #

MonadError e m => MonadError e (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

throwError :: e -> KatipContextT m a #

catchError :: KatipContextT m a -> (e -> KatipContextT m a) -> KatipContextT m a #

MonadBaseControl b m => MonadBaseControl b (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Associated Types

type StM (KatipContextT m) a :: Type

Methods

liftBaseWith :: (RunInBase (KatipContextT m) b -> b a) -> KatipContextT m a

restoreM :: StM (KatipContextT m) a -> KatipContextT m a

MonadBase b m => MonadBase b (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

liftBase :: b α -> KatipContextT m α

Monad m => Monad (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

(>>=) :: KatipContextT m a -> (a -> KatipContextT m b) -> KatipContextT m b #

(>>) :: KatipContextT m a -> KatipContextT m b -> KatipContextT m b #

return :: a -> KatipContextT m a #

fail :: String -> KatipContextT m a #

Functor m => Functor (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

fmap :: (a -> b) -> KatipContextT m a -> KatipContextT m b #

(<$) :: a -> KatipContextT m b -> KatipContextT m a #

MonadFix m => MonadFix (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

mfix :: (a -> KatipContextT m a) -> KatipContextT m a #

MonadFail m => MonadFail (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

fail :: String -> KatipContextT m a #

Applicative m => Applicative (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

pure :: a -> KatipContextT m a #

(<*>) :: KatipContextT m (a -> b) -> KatipContextT m a -> KatipContextT m b #

liftA2 :: (a -> b -> c) -> KatipContextT m a -> KatipContextT m b -> KatipContextT m c #

(*>) :: KatipContextT m a -> KatipContextT m b -> KatipContextT m b #

(<*) :: KatipContextT m a -> KatipContextT m b -> KatipContextT m a #

MonadIO m => MonadIO (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

liftIO :: IO a -> KatipContextT m a #

Alternative m => Alternative (KatipContextT m) 
Instance details

Defined in Katip.Monadic

MonadPlus m => MonadPlus (KatipContextT m) 
Instance details

Defined in Katip.Monadic

MonadIO m => Katip (KatipContextT m) 
Instance details

Defined in Katip.Monadic

MonadIO m => KatipContext (KatipContextT m) 
Instance details

Defined in Katip.Monadic

MonadCatch m => MonadCatch (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

catch :: Exception e => KatipContextT m a -> (e -> KatipContextT m a) -> KatipContextT m a

MonadMask m => MonadMask (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

mask :: ((forall a. KatipContextT m a -> KatipContextT m a) -> KatipContextT m b) -> KatipContextT m b #

uninterruptibleMask :: ((forall a. KatipContextT m a -> KatipContextT m a) -> KatipContextT m b) -> KatipContextT m b #

generalBracket :: KatipContextT m a -> (a -> ExitCase b -> KatipContextT m c) -> (a -> KatipContextT m b) -> KatipContextT m (b, c) #

MonadThrow m => MonadThrow (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

throwM :: Exception e => e -> KatipContextT m a

MonadUnliftIO m => MonadUnliftIO (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

askUnliftIO :: KatipContextT m (UnliftIO (KatipContextT m)) #

withRunInIO :: ((forall a. KatipContextT m a -> IO a) -> IO b) -> KatipContextT m b #

type StT KatipContextT a 
Instance details

Defined in Katip.Monadic

type StT KatipContextT a = StT (ReaderT KatipContextTState) a
type StM (KatipContextT m) a 
Instance details

Defined in Katip.Monadic

type StM (KatipContextT m) a = ComposeSt KatipContextT m a

data LogContexts #

Instances
Semigroup LogContexts 
Instance details

Defined in Katip.Monadic

Monoid LogContexts 
Instance details

Defined in Katip.Monadic

ToJSON LogContexts 
Instance details

Defined in Katip.Monadic

Methods

toJSON :: LogContexts -> Value

toEncoding :: LogContexts -> Encoding

toJSONList :: [LogContexts] -> Value

toEncodingList :: [LogContexts] -> Encoding

LogItem LogContexts 
Instance details

Defined in Katip.Monadic

Methods

payloadKeys :: Verbosity -> LogContexts -> PayloadSelection

ToObject LogContexts 
Instance details

Defined in Katip.Monadic

Methods

toObject :: LogContexts -> Object

(%~) :: ASetter s t a b -> (a -> b) -> s -> t #

(.~) :: ASetter s t a b -> b -> s -> t #

(^.) :: s -> Getting a s a -> a #

(^..) :: s -> Getting (Endo [a]) s a -> [a] #

(^?) :: s -> Getting (First a) s a -> Maybe a #

over :: ASetter s t a b -> (a -> b) -> s -> t #

set :: ASetter s t a b -> b -> s -> t #

preuse :: MonadState s m => Getting (First a) s a -> m (Maybe a) #

preview :: MonadReader s m => Getting (First a) s a -> m (Maybe a) #

use :: MonadState s m => Getting a s a -> m a #

view :: MonadReader s m => Getting a s a -> m a #

bracket :: MonadMask m => m a -> (a -> m b) -> (a -> m c) -> m c #

bracketOnError :: MonadMask m => m a -> (a -> m b) -> (a -> m c) -> m c #

bracket_ :: MonadMask m => m a -> m b -> m c -> m c #

catch :: (MonadCatch m, Exception e) => m a -> (e -> m a) -> m a #

catchAny :: MonadCatch m => m a -> (SomeException -> m a) -> m a #

finally :: MonadMask m => m a -> m b -> m a #

handleAny :: MonadCatch m => (SomeException -> m a) -> m a -> m a #

onException :: MonadMask m => m a -> m b -> m a #

throwM :: (MonadThrow m, Exception e) => e -> m a #

try :: (MonadCatch m, Exception e) => m a -> m (Either e a) #

tryAny :: MonadCatch m => m a -> m (Either SomeException a) #

pass :: Applicative f => f () #

($!) :: (a -> b) -> a -> b #

guardM :: MonadPlus m => m Bool -> m () #

ifM :: Monad m => m Bool -> m a -> m a -> m a #

unlessM :: Monad m => m Bool -> m () -> m () #

whenM :: Monad m => m Bool -> m () -> m () #

asum :: (Container t, Alternative f, Element t ~ f a) => t -> f a #

flipfoldl' :: (Container t, Element t ~ a) => (a -> b -> b) -> b -> t -> b #

forM_ :: (Container t, Monad m) => t -> (Element t -> m b) -> m () #

for_ :: (Container t, Applicative f) => t -> (Element t -> f b) -> f () #

mapM_ :: (Container t, Monad m) => (Element t -> m b) -> t -> m () #

product :: (Container t, Num (Element t)) => t -> Element t #

sequenceA_ :: (Container t, Applicative f, Element t ~ f a) => t -> f () #

sequence_ :: (Container t, Monad m, Element t ~ m a) => t -> m () #

sum :: (Container t, Num (Element t)) => t -> Element t #

traverse_ :: (Container t, Applicative f) => (Element t -> f b) -> t -> f () #

trace :: Text -> a -> a #

traceIdWith :: (a -> Text) -> a -> a #

traceM :: Monad m => Text -> m () #

traceShow :: Show a => a -> b -> b #

traceShowId :: Show a => a -> a #

traceShowIdWith :: Show s => (a -> s) -> a -> a #

traceShowM :: (Show a, Monad m) => a -> m () #

evaluateNF :: (NFData a, MonadIO m) => a -> m a #

evaluateNF_ :: (NFData a, MonadIO m) => a -> m () #

evaluateWHNF :: MonadIO m => a -> m a #

evaluateWHNF_ :: MonadIO m => a -> m () #

pattern Exc :: forall e. Exception e => e -> SomeException #

bug :: (HasCallStack, Exception e) => e -> a #

note :: MonadError e m => e -> Maybe a -> m a #

(<<$>>) :: (Functor f, Functor g) => (a -> b) -> f (g a) -> f (g b) #

map :: Functor f => (a -> b) -> f a -> f b #

atomically :: MonadIO m => STM a -> m a #

newEmptyMVar :: MonadIO m => m (MVar a) #

newMVar :: MonadIO m => a -> m (MVar a) #

newTVarIO :: MonadIO m => a -> m (TVar a) #

putMVar :: MonadIO m => MVar a -> a -> m () #

readMVar :: MonadIO m => MVar a -> m a #

readTVarIO :: MonadIO m => TVar a -> m a #

swapMVar :: MonadIO m => MVar a -> a -> m a #

takeMVar :: MonadIO m => MVar a -> m a #

tryPutMVar :: MonadIO m => MVar a -> a -> m Bool #

tryReadMVar :: MonadIO m => MVar a -> m (Maybe a) #

tryTakeMVar :: MonadIO m => MVar a -> m (Maybe a) #

die :: MonadIO m => String -> m a #

exitFailure :: MonadIO m => m a #

exitSuccess :: MonadIO m => m a #

exitWith :: MonadIO m => ExitCode -> m a #

appendFile :: MonadIO m => FilePath -> Text -> m () #

getLine :: MonadIO m => m Text #

hClose :: MonadIO m => Handle -> m () #

withFile :: (MonadIO m, MonadMask m) => FilePath -> IOMode -> (Handle -> m a) -> m a #

writeFile :: MonadIO m => FilePath -> Text -> m () #

atomicModifyIORef :: MonadIO m => IORef a -> (a -> (a, b)) -> m b #

atomicModifyIORef' :: MonadIO m => IORef a -> (a -> (a, b)) -> m b #

atomicWriteIORef :: MonadIO m => IORef a -> a -> m () #

modifyIORef :: MonadIO m => IORef a -> (a -> a) -> m () #

modifyIORef' :: MonadIO m => IORef a -> (a -> a) -> m () #

newIORef :: MonadIO m => a -> m (IORef a) #

readIORef :: MonadIO m => IORef a -> m a #

writeIORef :: MonadIO m => IORef a -> a -> m () #

uncons :: [a] -> Maybe (a, [a]) #

whenNotNull :: Applicative f => [a] -> (NonEmpty a -> f ()) -> f () #

whenNotNullM :: Monad m => m [a] -> (NonEmpty a -> m ()) -> m () #

allM :: (Container f, Monad m) => (Element f -> m Bool) -> f -> m Bool #

andM :: (Container f, Element f ~ m Bool, Monad m) => f -> m Bool #

anyM :: (Container f, Monad m) => (Element f -> m Bool) -> f -> m Bool #

concatForM :: (Applicative f, Monoid m, Container (l m), Element (l m) ~ m, Traversable l) => l a -> (a -> f m) -> f m #

concatMapM :: (Applicative f, Monoid m, Container (l m), Element (l m) ~ m, Traversable l) => (a -> f m) -> l a -> f m #

orM :: (Container f, Element f ~ m Bool, Monad m) => f -> m Bool #

fromLeft :: a -> Either a b -> a #

fromRight :: b -> Either a b -> b #

maybeToLeft :: r -> Maybe l -> Either l r #

maybeToRight :: l -> Maybe r -> Either l r #

whenLeft :: Applicative f => Either l r -> (l -> f ()) -> f () #

whenLeftM :: Monad m => m (Either l r) -> (l -> m ()) -> m () #

whenRight :: Applicative f => Either l r -> (r -> f ()) -> f () #

whenRightM :: Monad m => m (Either l r) -> (r -> m ()) -> m () #

(?:) :: Maybe a -> a -> a #

whenJust :: Applicative f => Maybe a -> (a -> f ()) -> f () #

whenJustM :: Monad m => m (Maybe a) -> (a -> m ()) -> m () #

whenNothing :: Applicative f => Maybe a -> f a -> f a #

whenNothingM :: Monad m => m (Maybe a) -> m a -> m a #

whenNothingM_ :: Monad m => m (Maybe a) -> m () -> m () #

whenNothing_ :: Applicative f => Maybe a -> f () -> f () #

evaluatingState :: s -> State s a -> a #

evaluatingStateT :: Functor f => s -> StateT s f a -> f a #

executingState :: s -> State s a -> s #

executingStateT :: Functor f => s -> StateT s f a -> f s #

usingReader :: r -> Reader r a -> a #

usingReaderT :: r -> ReaderT r m a -> m a #

usingState :: s -> State s a -> (a, s) #

usingStateT :: s -> StateT s m a -> m (a, s) #

maybeToMonoid :: Monoid m => Maybe m -> m #

hashNub :: (Eq a, Hashable a) => [a] -> [a] #

ordNub :: Ord a => [a] -> [a] #

sortNub :: Ord a => [a] -> [a] #

unstableNub :: (Eq a, Hashable a) => [a] -> [a] #

hPrint :: (MonadIO m, Show a) => Handle -> a -> m () #

hPutStr :: (Print a, MonadIO m) => Handle -> a -> m () #

hPutStrLn :: (Print a, MonadIO m) => Handle -> a -> m () #

print :: (MonadIO m, Show a) => a -> m () #

putLText :: MonadIO m => Text -> m () #

putLTextLn :: MonadIO m => Text -> m () #

putStr :: (Print a, MonadIO m) => a -> m () #

putStrLn :: (Print a, MonadIO m) => a -> m () #

putText :: MonadIO m => Text -> m () #

putTextLn :: MonadIO m => Text -> m () #

readEither :: (ToString a, Read b) => a -> Either Text b #

show :: (Show a, IsString b) => a -> b #

class MonadThrow m => MonadCatch (m :: Type -> Type) #

Minimal complete definition

catch

Instances
MonadCatch IO 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => IO a -> (e -> IO a) -> IO a

MonadCatch STM 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => STM a -> (e -> STM a) -> STM a

e ~ SomeException => MonadCatch (Either e) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e0 => Either e a -> (e0 -> Either e a) -> Either e a

MonadCatch m => MonadCatch (ListT m) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => ListT m a -> (e -> ListT m a) -> ListT m a

MonadCatch m => MonadCatch (MaybeT m) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => MaybeT m a -> (e -> MaybeT m a) -> MaybeT m a

MonadCatch m => MonadCatch (KatipT m) 
Instance details

Defined in Katip.Core

Methods

catch :: Exception e => KatipT m a -> (e -> KatipT m a) -> KatipT m a

MonadCatch m => MonadCatch (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

catch :: Exception e => KatipContextT m a -> (e -> KatipContextT m a) -> KatipContextT m a

MonadCatch m => MonadCatch (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

catch :: Exception e => ResourceT m a -> (e -> ResourceT m a) -> ResourceT m a

MonadCatch m => MonadCatch (NoLoggingT m) 
Instance details

Defined in Katip.Monadic

Methods

catch :: Exception e => NoLoggingT m a -> (e -> NoLoggingT m a) -> NoLoggingT m a

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

MonadCatch m => MonadCatch (NoLoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

catch :: Exception e => NoLoggingT m a -> (e -> NoLoggingT m a) -> NoLoggingT m a

MonadCatch m => MonadCatch (WriterLoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

catch :: Exception e => WriterLoggingT m a -> (e -> WriterLoggingT m a) -> WriterLoggingT m a

MonadCatch m => MonadCatch (IdentityT m) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => IdentityT m a -> (e -> IdentityT m a) -> IdentityT m a

(Error e, MonadCatch m) => MonadCatch (ErrorT e m) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e0 => ErrorT e m a -> (e0 -> ErrorT e m a) -> ErrorT e m a

MonadCatch m => MonadCatch (ExceptT e m) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e0 => ExceptT e m a -> (e0 -> ExceptT e m a) -> ExceptT e 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

MonadCatch m => MonadCatch (StateT s m) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => StateT s m a -> (e -> StateT s m a) -> StateT s m a

MonadCatch m => MonadCatch (StateT s m) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => StateT s m a -> (e -> StateT s m a) -> StateT s m a

(MonadCatch m, Monoid w) => MonadCatch (WriterT w m) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => WriterT w m a -> (e -> WriterT w m a) -> WriterT w m a

(MonadCatch m, Monoid w) => MonadCatch (WriterT w m) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => WriterT w m a -> (e -> WriterT w m a) -> WriterT w m a

(MonadCatch m, Monoid w) => MonadCatch (RWST r w s m) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => RWST r w s m a -> (e -> RWST r w s m a) -> RWST r w s m a

(MonadCatch m, Monoid w) => MonadCatch (RWST r w s m) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => RWST r w s m a -> (e -> RWST r w s m a) -> RWST r w s m a

class MonadCatch m => MonadMask (m :: Type -> Type) where #

Methods

mask :: ((forall a. m a -> m a) -> m b) -> m b #

uninterruptibleMask :: ((forall a. m a -> m a) -> m b) -> m b #

generalBracket :: m a -> (a -> ExitCase b -> m c) -> (a -> m b) -> m (b, c) #

Instances
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) 
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 (MaybeT m) 
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 (KatipT m) 
Instance details

Defined in Katip.Core

Methods

mask :: ((forall a. KatipT m a -> KatipT m a) -> KatipT m b) -> KatipT m b #

uninterruptibleMask :: ((forall a. KatipT m a -> KatipT m a) -> KatipT m b) -> KatipT m b #

generalBracket :: KatipT m a -> (a -> ExitCase b -> KatipT m c) -> (a -> KatipT m b) -> KatipT m (b, c) #

MonadMask m => MonadMask (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

mask :: ((forall a. KatipContextT m a -> KatipContextT m a) -> KatipContextT m b) -> KatipContextT m b #

uninterruptibleMask :: ((forall a. KatipContextT m a -> KatipContextT m a) -> KatipContextT m b) -> KatipContextT m b #

generalBracket :: KatipContextT m a -> (a -> ExitCase b -> KatipContextT m c) -> (a -> KatipContextT m b) -> KatipContextT 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 (NoLoggingT m) 
Instance details

Defined in Katip.Monadic

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 (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 (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) #

(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) 
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 (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) #

class Monad m => MonadThrow (m :: Type -> Type) #

Minimal complete definition

throwM

Instances
MonadThrow [] 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> [a]

MonadThrow Maybe 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> Maybe 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 STM 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> STM 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 (ListT m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> ListT m a

MonadThrow m => MonadThrow (MaybeT m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> MaybeT m a

MonadThrow m => MonadThrow (KatipT m) 
Instance details

Defined in Katip.Core

Methods

throwM :: Exception e => e -> KatipT m a

MonadThrow m => MonadThrow (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

throwM :: Exception e => e -> KatipContextT 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 m => MonadThrow (NoLoggingT m) 
Instance details

Defined in Katip.Monadic

Methods

throwM :: Exception e => e -> NoLoggingT m 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 (IdentityT m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> IdentityT m a

(Error e, MonadThrow m) => MonadThrow (ErrorT e m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e0 => e0 -> ErrorT e m a

MonadThrow m => MonadThrow (ExceptT e m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e0 => e0 -> ExceptT e 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 (ContT r m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> ContT r 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, 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

_1 :: Field1 s t a b => Lens s t a b #

_2 :: Field2 s t a b => Lens s t a b #

_3 :: Field3 s t a b => Lens s t a b #

_4 :: Field4 s t a b => Lens s t a b #

_5 :: Field5 s t a b => Lens s t a b #

type Lens s t a b = forall (f :: Type -> Type). Functor f => (a -> f b) -> s -> f t #

type Lens' s a = Lens s s a a #

type Traversal s t a b = forall (f :: Type -> Type). Applicative f => (a -> f b) -> s -> f t #

type Traversal' s a = Traversal s s a a #

class Container t where #

Minimal complete definition

Nothing

Associated Types

type Element t :: Type #

Methods

toList :: t -> [Element t] #

null :: t -> Bool #

foldr :: (Element t -> b -> b) -> b -> t -> b #

foldl :: (b -> Element t -> b) -> b -> t -> b #

foldl' :: (b -> Element t -> b) -> b -> t -> b #

length :: t -> Int #

elem :: Element t -> t -> Bool #

maximum :: t -> Element t #

minimum :: t -> Element t #

foldMap :: Monoid m => (Element t -> m) -> t -> m #

fold :: t -> Element t #

foldr' :: (Element t -> b -> b) -> b -> t -> b #

foldr1 :: (Element t -> Element t -> Element t) -> t -> Element t #

foldl1 :: (Element t -> Element t -> Element t) -> t -> Element t #

notElem :: Element t -> t -> Bool #

all :: (Element t -> Bool) -> t -> Bool #

any :: (Element t -> Bool) -> t -> Bool #

and :: t -> Bool #

or :: t -> Bool #

find :: (Element t -> Bool) -> t -> Maybe (Element t) #

safeHead :: t -> Maybe (Element t) #

Instances
Container ByteString 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element ByteString :: Type #

Container ByteString 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element ByteString :: Type #

Container IntSet 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element IntSet :: Type #

Container Text 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element Text :: Type #

Methods

toList :: Text -> [Element Text] #

null :: Text -> Bool #

foldr :: (Element Text -> b -> b) -> b -> Text -> b #

foldl :: (b -> Element Text -> b) -> b -> Text -> b #

foldl' :: (b -> Element Text -> b) -> b -> Text -> b #

length :: Text -> Int #

elem :: Element Text -> Text -> Bool #

maximum :: Text -> Element Text #

minimum :: Text -> Element Text #

foldMap :: Monoid m => (Element Text -> m) -> Text -> m #

fold :: Text -> Element Text #

foldr' :: (Element Text -> b -> b) -> b -> Text -> b #

foldr1 :: (Element Text -> Element Text -> Element Text) -> Text -> Element Text #

foldl1 :: (Element Text -> Element Text -> Element Text) -> Text -> Element Text #

notElem :: Element Text -> Text -> Bool #

all :: (Element Text -> Bool) -> Text -> Bool #

any :: (Element Text -> Bool) -> Text -> Bool #

and :: Text -> Bool #

or :: Text -> Bool #

find :: (Element Text -> Bool) -> Text -> Maybe (Element Text) #

safeHead :: Text -> Maybe (Element Text) #

Container Text 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element Text :: Type #

Methods

toList :: Text -> [Element Text] #

null :: Text -> Bool #

foldr :: (Element Text -> b -> b) -> b -> Text -> b #

foldl :: (b -> Element Text -> b) -> b -> Text -> b #

foldl' :: (b -> Element Text -> b) -> b -> Text -> b #

length :: Text -> Int #

elem :: Element Text -> Text -> Bool #

maximum :: Text -> Element Text #

minimum :: Text -> Element Text #

foldMap :: Monoid m => (Element Text -> m) -> Text -> m #

fold :: Text -> Element Text #

foldr' :: (Element Text -> b -> b) -> b -> Text -> b #

foldr1 :: (Element Text -> Element Text -> Element Text) -> Text -> Element Text #

foldl1 :: (Element Text -> Element Text -> Element Text) -> Text -> Element Text #

notElem :: Element Text -> Text -> Bool #

all :: (Element Text -> Bool) -> Text -> Bool #

any :: (Element Text -> Bool) -> Text -> Bool #

and :: Text -> Bool #

or :: Text -> Bool #

find :: (Element Text -> Bool) -> Text -> Maybe (Element Text) #

safeHead :: Text -> Maybe (Element Text) #

Container [a] 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element [a] :: Type #

Methods

toList :: [a] -> [Element [a]] #

null :: [a] -> Bool #

foldr :: (Element [a] -> b -> b) -> b -> [a] -> b #

foldl :: (b -> Element [a] -> b) -> b -> [a] -> b #

foldl' :: (b -> Element [a] -> b) -> b -> [a] -> b #

length :: [a] -> Int #

elem :: Element [a] -> [a] -> Bool #

maximum :: [a] -> Element [a] #

minimum :: [a] -> Element [a] #

foldMap :: Monoid m => (Element [a] -> m) -> [a] -> m #

fold :: [a] -> Element [a] #

foldr' :: (Element [a] -> b -> b) -> b -> [a] -> b #

foldr1 :: (Element [a] -> Element [a] -> Element [a]) -> [a] -> Element [a] #

foldl1 :: (Element [a] -> Element [a] -> Element [a]) -> [a] -> Element [a] #

notElem :: Element [a] -> [a] -> Bool #

all :: (Element [a] -> Bool) -> [a] -> Bool #

any :: (Element [a] -> Bool) -> [a] -> Bool #

and :: [a] -> Bool #

or :: [a] -> Bool #

find :: (Element [a] -> Bool) -> [a] -> Maybe (Element [a]) #

safeHead :: [a] -> Maybe (Element [a]) #

(TypeError (DisallowInstance "Maybe") :: Constraint) => Container (Maybe a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Maybe a) :: Type #

Methods

toList :: Maybe a -> [Element (Maybe a)] #

null :: Maybe a -> Bool #

foldr :: (Element (Maybe a) -> b -> b) -> b -> Maybe a -> b #

foldl :: (b -> Element (Maybe a) -> b) -> b -> Maybe a -> b #

foldl' :: (b -> Element (Maybe a) -> b) -> b -> Maybe a -> b #

length :: Maybe a -> Int #

elem :: Element (Maybe a) -> Maybe a -> Bool #

maximum :: Maybe a -> Element (Maybe a) #

minimum :: Maybe a -> Element (Maybe a) #

foldMap :: Monoid m => (Element (Maybe a) -> m) -> Maybe a -> m #

fold :: Maybe a -> Element (Maybe a) #

foldr' :: (Element (Maybe a) -> b -> b) -> b -> Maybe a -> b #

foldr1 :: (Element (Maybe a) -> Element (Maybe a) -> Element (Maybe a)) -> Maybe a -> Element (Maybe a) #

foldl1 :: (Element (Maybe a) -> Element (Maybe a) -> Element (Maybe a)) -> Maybe a -> Element (Maybe a) #

notElem :: Element (Maybe a) -> Maybe a -> Bool #

all :: (Element (Maybe a) -> Bool) -> Maybe a -> Bool #

any :: (Element (Maybe a) -> Bool) -> Maybe a -> Bool #

and :: Maybe a -> Bool #

or :: Maybe a -> Bool #

find :: (Element (Maybe a) -> Bool) -> Maybe a -> Maybe (Element (Maybe a)) #

safeHead :: Maybe a -> Maybe (Element (Maybe a)) #

Container (ZipList a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (ZipList a) :: Type #

Methods

toList :: ZipList a -> [Element (ZipList a)] #

null :: ZipList a -> Bool #

foldr :: (Element (ZipList a) -> b -> b) -> b -> ZipList a -> b #

foldl :: (b -> Element (ZipList a) -> b) -> b -> ZipList a -> b #

foldl' :: (b -> Element (ZipList a) -> b) -> b -> ZipList a -> b #

length :: ZipList a -> Int #

elem :: Element (ZipList a) -> ZipList a -> Bool #

maximum :: ZipList a -> Element (ZipList a) #

minimum :: ZipList a -> Element (ZipList a) #

foldMap :: Monoid m => (Element (ZipList a) -> m) -> ZipList a -> m #

fold :: ZipList a -> Element (ZipList a) #

foldr' :: (Element (ZipList a) -> b -> b) -> b -> ZipList a -> b #

foldr1 :: (Element (ZipList a) -> Element (ZipList a) -> Element (ZipList a)) -> ZipList a -> Element (ZipList a) #

foldl1 :: (Element (ZipList a) -> Element (ZipList a) -> Element (ZipList a)) -> ZipList a -> Element (ZipList a) #

notElem :: Element (ZipList a) -> ZipList a -> Bool #

all :: (Element (ZipList a) -> Bool) -> ZipList a -> Bool #

any :: (Element (ZipList a) -> Bool) -> ZipList a -> Bool #

and :: ZipList a -> Bool #

or :: ZipList a -> Bool #

find :: (Element (ZipList a) -> Bool) -> ZipList a -> Maybe (Element (ZipList a)) #

safeHead :: ZipList a -> Maybe (Element (ZipList a)) #

(TypeError (DisallowInstance "Identity") :: Constraint) => Container (Identity a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Identity a) :: Type #

Methods

toList :: Identity a -> [Element (Identity a)] #

null :: Identity a -> Bool #

foldr :: (Element (Identity a) -> b -> b) -> b -> Identity a -> b #

foldl :: (b -> Element (Identity a) -> b) -> b -> Identity a -> b #

foldl' :: (b -> Element (Identity a) -> b) -> b -> Identity a -> b #

length :: Identity a -> Int #

elem :: Element (Identity a) -> Identity a -> Bool #

maximum :: Identity a -> Element (Identity a) #

minimum :: Identity a -> Element (Identity a) #

foldMap :: Monoid m => (Element (Identity a) -> m) -> Identity a -> m #

fold :: Identity a -> Element (Identity a) #

foldr' :: (Element (Identity a) -> b -> b) -> b -> Identity a -> b #

foldr1 :: (Element (Identity a) -> Element (Identity a) -> Element (Identity a)) -> Identity a -> Element (Identity a) #

foldl1 :: (Element (Identity a) -> Element (Identity a) -> Element (Identity a)) -> Identity a -> Element (Identity a) #

notElem :: Element (Identity a) -> Identity a -> Bool #

all :: (Element (Identity a) -> Bool) -> Identity a -> Bool #

any :: (Element (Identity a) -> Bool) -> Identity a -> Bool #

and :: Identity a -> Bool #

or :: Identity a -> Bool #

find :: (Element (Identity a) -> Bool) -> Identity a -> Maybe (Element (Identity a)) #

safeHead :: Identity a -> Maybe (Element (Identity a)) #

Container (First a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (First a) :: Type #

Methods

toList :: First a -> [Element (First a)] #

null :: First a -> Bool #

foldr :: (Element (First a) -> b -> b) -> b -> First a -> b #

foldl :: (b -> Element (First a) -> b) -> b -> First a -> b #

foldl' :: (b -> Element (First a) -> b) -> b -> First a -> b #

length :: First a -> Int #

elem :: Element (First a) -> First a -> Bool #

maximum :: First a -> Element (First a) #

minimum :: First a -> Element (First a) #

foldMap :: Monoid m => (Element (First a) -> m) -> First a -> m #

fold :: First a -> Element (First a) #

foldr' :: (Element (First a) -> b -> b) -> b -> First a -> b #

foldr1 :: (Element (First a) -> Element (First a) -> Element (First a)) -> First a -> Element (First a) #

foldl1 :: (Element (First a) -> Element (First a) -> Element (First a)) -> First a -> Element (First a) #

notElem :: Element (First a) -> First a -> Bool #

all :: (Element (First a) -> Bool) -> First a -> Bool #

any :: (Element (First a) -> Bool) -> First a -> Bool #

and :: First a -> Bool #

or :: First a -> Bool #

find :: (Element (First a) -> Bool) -> First a -> Maybe (Element (First a)) #

safeHead :: First a -> Maybe (Element (First a)) #

Container (Last a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Last a) :: Type #

Methods

toList :: Last a -> [Element (Last a)] #

null :: Last a -> Bool #

foldr :: (Element (Last a) -> b -> b) -> b -> Last a -> b #

foldl :: (b -> Element (Last a) -> b) -> b -> Last a -> b #

foldl' :: (b -> Element (Last a) -> b) -> b -> Last a -> b #

length :: Last a -> Int #

elem :: Element (Last a) -> Last a -> Bool #

maximum :: Last a -> Element (Last a) #

minimum :: Last a -> Element (Last a) #

foldMap :: Monoid m => (Element (Last a) -> m) -> Last a -> m #

fold :: Last a -> Element (Last a) #

foldr' :: (Element (Last a) -> b -> b) -> b -> Last a -> b #

foldr1 :: (Element (Last a) -> Element (Last a) -> Element (Last a)) -> Last a -> Element (Last a) #

foldl1 :: (Element (Last a) -> Element (Last a) -> Element (Last a)) -> Last a -> Element (Last a) #

notElem :: Element (Last a) -> Last a -> Bool #

all :: (Element (Last a) -> Bool) -> Last a -> Bool #

any :: (Element (Last a) -> Bool) -> Last a -> Bool #

and :: Last a -> Bool #

or :: Last a -> Bool #

find :: (Element (Last a) -> Bool) -> Last a -> Maybe (Element (Last a)) #

safeHead :: Last a -> Maybe (Element (Last a)) #

Container (Dual a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Dual a) :: Type #

Methods

toList :: Dual a -> [Element (Dual a)] #

null :: Dual a -> Bool #

foldr :: (Element (Dual a) -> b -> b) -> b -> Dual a -> b #

foldl :: (b -> Element (Dual a) -> b) -> b -> Dual a -> b #

foldl' :: (b -> Element (Dual a) -> b) -> b -> Dual a -> b #

length :: Dual a -> Int #

elem :: Element (Dual a) -> Dual a -> Bool #

maximum :: Dual a -> Element (Dual a) #

minimum :: Dual a -> Element (Dual a) #

foldMap :: Monoid m => (Element (Dual a) -> m) -> Dual a -> m #

fold :: Dual a -> Element (Dual a) #

foldr' :: (Element (Dual a) -> b -> b) -> b -> Dual a -> b #

foldr1 :: (Element (Dual a) -> Element (Dual a) -> Element (Dual a)) -> Dual a -> Element (Dual a) #

foldl1 :: (Element (Dual a) -> Element (Dual a) -> Element (Dual a)) -> Dual a -> Element (Dual a) #

notElem :: Element (Dual a) -> Dual a -> Bool #

all :: (Element (Dual a) -> Bool) -> Dual a -> Bool #

any :: (Element (Dual a) -> Bool) -> Dual a -> Bool #

and :: Dual a -> Bool #

or :: Dual a -> Bool #

find :: (Element (Dual a) -> Bool) -> Dual a -> Maybe (Element (Dual a)) #

safeHead :: Dual a -> Maybe (Element (Dual a)) #

Container (Sum a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Sum a) :: Type #

Methods

toList :: Sum a -> [Element (Sum a)] #

null :: Sum a -> Bool #

foldr :: (Element (Sum a) -> b -> b) -> b -> Sum a -> b #

foldl :: (b -> Element (Sum a) -> b) -> b -> Sum a -> b #

foldl' :: (b -> Element (Sum a) -> b) -> b -> Sum a -> b #

length :: Sum a -> Int #

elem :: Element (Sum a) -> Sum a -> Bool #

maximum :: Sum a -> Element (Sum a) #

minimum :: Sum a -> Element (Sum a) #

foldMap :: Monoid m => (Element (Sum a) -> m) -> Sum a -> m #

fold :: Sum a -> Element (Sum a) #

foldr' :: (Element (Sum a) -> b -> b) -> b -> Sum a -> b #

foldr1 :: (Element (Sum a) -> Element (Sum a) -> Element (Sum a)) -> Sum a -> Element (Sum a) #

foldl1 :: (Element (Sum a) -> Element (Sum a) -> Element (Sum a)) -> Sum a -> Element (Sum a) #

notElem :: Element (Sum a) -> Sum a -> Bool #

all :: (Element (Sum a) -> Bool) -> Sum a -> Bool #

any :: (Element (Sum a) -> Bool) -> Sum a -> Bool #

and :: Sum a -> Bool #

or :: Sum a -> Bool #

find :: (Element (Sum a) -> Bool) -> Sum a -> Maybe (Element (Sum a)) #

safeHead :: Sum a -> Maybe (Element (Sum a)) #

Container (Product a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Product a) :: Type #

Methods

toList :: Product a -> [Element (Product a)] #

null :: Product a -> Bool #

foldr :: (Element (Product a) -> b -> b) -> b -> Product a -> b #

foldl :: (b -> Element (Product a) -> b) -> b -> Product a -> b #

foldl' :: (b -> Element (Product a) -> b) -> b -> Product a -> b #

length :: Product a -> Int #

elem :: Element (Product a) -> Product a -> Bool #

maximum :: Product a -> Element (Product a) #

minimum :: Product a -> Element (Product a) #

foldMap :: Monoid m => (Element (Product a) -> m) -> Product a -> m #

fold :: Product a -> Element (Product a) #

foldr' :: (Element (Product a) -> b -> b) -> b -> Product a -> b #

foldr1 :: (Element (Product a) -> Element (Product a) -> Element (Product a)) -> Product a -> Element (Product a) #

foldl1 :: (Element (Product a) -> Element (Product a) -> Element (Product a)) -> Product a -> Element (Product a) #

notElem :: Element (Product a) -> Product a -> Bool #

all :: (Element (Product a) -> Bool) -> Product a -> Bool #

any :: (Element (Product a) -> Bool) -> Product a -> Bool #

and :: Product a -> Bool #

or :: Product a -> Bool #

find :: (Element (Product a) -> Bool) -> Product a -> Maybe (Element (Product a)) #

safeHead :: Product a -> Maybe (Element (Product a)) #

Container (NonEmpty a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (NonEmpty a) :: Type #

Methods

toList :: NonEmpty a -> [Element (NonEmpty a)] #

null :: NonEmpty a -> Bool #

foldr :: (Element (NonEmpty a) -> b -> b) -> b -> NonEmpty a -> b #

foldl :: (b -> Element (NonEmpty a) -> b) -> b -> NonEmpty a -> b #

foldl' :: (b -> Element (NonEmpty a) -> b) -> b -> NonEmpty a -> b #

length :: NonEmpty a -> Int #

elem :: Element (NonEmpty a) -> NonEmpty a -> Bool #

maximum :: NonEmpty a -> Element (NonEmpty a) #

minimum :: NonEmpty a -> Element (NonEmpty a) #

foldMap :: Monoid m => (Element (NonEmpty a) -> m) -> NonEmpty a -> m #

fold :: NonEmpty a -> Element (NonEmpty a) #

foldr' :: (Element (NonEmpty a) -> b -> b) -> b -> NonEmpty a -> b #

foldr1 :: (Element (NonEmpty a) -> Element (NonEmpty a) -> Element (NonEmpty a)) -> NonEmpty a -> Element (NonEmpty a) #

foldl1 :: (Element (NonEmpty a) -> Element (NonEmpty a) -> Element (NonEmpty a)) -> NonEmpty a -> Element (NonEmpty a) #

notElem :: Element (NonEmpty a) -> NonEmpty a -> Bool #

all :: (Element (NonEmpty a) -> Bool) -> NonEmpty a -> Bool #

any :: (Element (NonEmpty a) -> Bool) -> NonEmpty a -> Bool #

and :: NonEmpty a -> Bool #

or :: NonEmpty a -> Bool #

find :: (Element (NonEmpty a) -> Bool) -> NonEmpty a -> Maybe (Element (NonEmpty a)) #

safeHead :: NonEmpty a -> Maybe (Element (NonEmpty a)) #

Container (IntMap v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (IntMap v) :: Type #

Methods

toList :: IntMap v -> [Element (IntMap v)] #

null :: IntMap v -> Bool #

foldr :: (Element (IntMap v) -> b -> b) -> b -> IntMap v -> b #

foldl :: (b -> Element (IntMap v) -> b) -> b -> IntMap v -> b #

foldl' :: (b -> Element (IntMap v) -> b) -> b -> IntMap v -> b #

length :: IntMap v -> Int #

elem :: Element (IntMap v) -> IntMap v -> Bool #

maximum :: IntMap v -> Element (IntMap v) #

minimum :: IntMap v -> Element (IntMap v) #

foldMap :: Monoid m => (Element (IntMap v) -> m) -> IntMap v -> m #

fold :: IntMap v -> Element (IntMap v) #

foldr' :: (Element (IntMap v) -> b -> b) -> b -> IntMap v -> b #

foldr1 :: (Element (IntMap v) -> Element (IntMap v) -> Element (IntMap v)) -> IntMap v -> Element (IntMap v) #

foldl1 :: (Element (IntMap v) -> Element (IntMap v) -> Element (IntMap v)) -> IntMap v -> Element (IntMap v) #

notElem :: Element (IntMap v) -> IntMap v -> Bool #

all :: (Element (IntMap v) -> Bool) -> IntMap v -> Bool #

any :: (Element (IntMap v) -> Bool) -> IntMap v -> Bool #

and :: IntMap v -> Bool #

or :: IntMap v -> Bool #

find :: (Element (IntMap v) -> Bool) -> IntMap v -> Maybe (Element (IntMap v)) #

safeHead :: IntMap v -> Maybe (Element (IntMap v)) #

Container (Seq a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Seq a) :: Type #

Methods

toList :: Seq a -> [Element (Seq a)] #

null :: Seq a -> Bool #

foldr :: (Element (Seq a) -> b -> b) -> b -> Seq a -> b #

foldl :: (b -> Element (Seq a) -> b) -> b -> Seq a -> b #

foldl' :: (b -> Element (Seq a) -> b) -> b -> Seq a -> b #

length :: Seq a -> Int #

elem :: Element (Seq a) -> Seq a -> Bool #

maximum :: Seq a -> Element (Seq a) #

minimum :: Seq a -> Element (Seq a) #

foldMap :: Monoid m => (Element (Seq a) -> m) -> Seq a -> m #

fold :: Seq a -> Element (Seq a) #

foldr' :: (Element (Seq a) -> b -> b) -> b -> Seq a -> b #

foldr1 :: (Element (Seq a) -> Element (Seq a) -> Element (Seq a)) -> Seq a -> Element (Seq a) #

foldl1 :: (Element (Seq a) -> Element (Seq a) -> Element (Seq a)) -> Seq a -> Element (Seq a) #

notElem :: Element (Seq a) -> Seq a -> Bool #

all :: (Element (Seq a) -> Bool) -> Seq a -> Bool #

any :: (Element (Seq a) -> Bool) -> Seq a -> Bool #

and :: Seq a -> Bool #

or :: Seq a -> Bool #

find :: (Element (Seq a) -> Bool) -> Seq a -> Maybe (Element (Seq a)) #

safeHead :: Seq a -> Maybe (Element (Seq a)) #

Ord v => Container (Set v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Set v) :: Type #

Methods

toList :: Set v -> [Element (Set v)] #

null :: Set v -> Bool #

foldr :: (Element (Set v) -> b -> b) -> b -> Set v -> b #

foldl :: (b -> Element (Set v) -> b) -> b -> Set v -> b #

foldl' :: (b -> Element (Set v) -> b) -> b -> Set v -> b #

length :: Set v -> Int #

elem :: Element (Set v) -> Set v -> Bool #

maximum :: Set v -> Element (Set v) #

minimum :: Set v -> Element (Set v) #

foldMap :: Monoid m => (Element (Set v) -> m) -> Set v -> m #

fold :: Set v -> Element (Set v) #

foldr' :: (Element (Set v) -> b -> b) -> b -> Set v -> b #

foldr1 :: (Element (Set v) -> Element (Set v) -> Element (Set v)) -> Set v -> Element (Set v) #

foldl1 :: (Element (Set v) -> Element (Set v) -> Element (Set v)) -> Set v -> Element (Set v) #

notElem :: Element (Set v) -> Set v -> Bool #

all :: (Element (Set v) -> Bool) -> Set v -> Bool #

any :: (Element (Set v) -> Bool) -> Set v -> Bool #

and :: Set v -> Bool #

or :: Set v -> Bool #

find :: (Element (Set v) -> Bool) -> Set v -> Maybe (Element (Set v)) #

safeHead :: Set v -> Maybe (Element (Set v)) #

Container (Vector a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Vector a) :: Type #

Methods

toList :: Vector a -> [Element (Vector a)] #

null :: Vector a -> Bool #

foldr :: (Element (Vector a) -> b -> b) -> b -> Vector a -> b #

foldl :: (b -> Element (Vector a) -> b) -> b -> Vector a -> b #

foldl' :: (b -> Element (Vector a) -> b) -> b -> Vector a -> b #

length :: Vector a -> Int #

elem :: Element (Vector a) -> Vector a -> Bool #

maximum :: Vector a -> Element (Vector a) #

minimum :: Vector a -> Element (Vector a) #

foldMap :: Monoid m => (Element (Vector a) -> m) -> Vector a -> m #

fold :: Vector a -> Element (Vector a) #

foldr' :: (Element (Vector a) -> b -> b) -> b -> Vector a -> b #

foldr1 :: (Element (Vector a) -> Element (Vector a) -> Element (Vector a)) -> Vector a -> Element (Vector a) #

foldl1 :: (Element (Vector a) -> Element (Vector a) -> Element (Vector a)) -> Vector a -> Element (Vector a) #

notElem :: Element (Vector a) -> Vector a -> Bool #

all :: (Element (Vector a) -> Bool) -> Vector a -> Bool #

any :: (Element (Vector a) -> Bool) -> Vector a -> Bool #

and :: Vector a -> Bool #

or :: Vector a -> Bool #

find :: (Element (Vector a) -> Bool) -> Vector a -> Maybe (Element (Vector a)) #

safeHead :: Vector a -> Maybe (Element (Vector a)) #

(Eq v, Hashable v) => Container (HashSet v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (HashSet v) :: Type #

Methods

toList :: HashSet v -> [Element (HashSet v)] #

null :: HashSet v -> Bool #

foldr :: (Element (HashSet v) -> b -> b) -> b -> HashSet v -> b #

foldl :: (b -> Element (HashSet v) -> b) -> b -> HashSet v -> b #

foldl' :: (b -> Element (HashSet v) -> b) -> b -> HashSet v -> b #

length :: HashSet v -> Int #

elem :: Element (HashSet v) -> HashSet v -> Bool #

maximum :: HashSet v -> Element (HashSet v) #

minimum :: HashSet v -> Element (HashSet v) #

foldMap :: Monoid m => (Element (HashSet v) -> m) -> HashSet v -> m #

fold :: HashSet v -> Element (HashSet v) #

foldr' :: (Element (HashSet v) -> b -> b) -> b -> HashSet v -> b #

foldr1 :: (Element (HashSet v) -> Element (HashSet v) -> Element (HashSet v)) -> HashSet v -> Element (HashSet v) #

foldl1 :: (Element (HashSet v) -> Element (HashSet v) -> Element (HashSet v)) -> HashSet v -> Element (HashSet v) #

notElem :: Element (HashSet v) -> HashSet v -> Bool #

all :: (Element (HashSet v) -> Bool) -> HashSet v -> Bool #

any :: (Element (HashSet v) -> Bool) -> HashSet v -> Bool #

and :: HashSet v -> Bool #

or :: HashSet v -> Bool #

find :: (Element (HashSet v) -> Bool) -> HashSet v -> Maybe (Element (HashSet v)) #

safeHead :: HashSet v -> Maybe (Element (HashSet v)) #

(TypeError (DisallowInstance "Either") :: Constraint) => Container (Either a b) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Either a b) :: Type #

Methods

toList :: Either a b -> [Element (Either a b)] #

null :: Either a b -> Bool #

foldr :: (Element (Either a b) -> b0 -> b0) -> b0 -> Either a b -> b0 #

foldl :: (b0 -> Element (Either a b) -> b0) -> b0 -> Either a b -> b0 #

foldl' :: (b0 -> Element (Either a b) -> b0) -> b0 -> Either a b -> b0 #

length :: Either a b -> Int #

elem :: Element (Either a b) -> Either a b -> Bool #

maximum :: Either a b -> Element (Either a b) #

minimum :: Either a b -> Element (Either a b) #

foldMap :: Monoid m => (Element (Either a b) -> m) -> Either a b -> m #

fold :: Either a b -> Element (Either a b) #

foldr' :: (Element (Either a b) -> b0 -> b0) -> b0 -> Either a b -> b0 #

foldr1 :: (Element (Either a b) -> Element (Either a b) -> Element (Either a b)) -> Either a b -> Element (Either a b) #

foldl1 :: (Element (Either a b) -> Element (Either a b) -> Element (Either a b)) -> Either a b -> Element (Either a b) #

notElem :: Element (Either a b) -> Either a b -> Bool #

all :: (Element (Either a b) -> Bool) -> Either a b -> Bool #

any :: (Element (Either a b) -> Bool) -> Either a b -> Bool #

and :: Either a b -> Bool #

or :: Either a b -> Bool #

find :: (Element (Either a b) -> Bool) -> Either a b -> Maybe (Element (Either a b)) #

safeHead :: Either a b -> Maybe (Element (Either a b)) #

(TypeError (DisallowInstance "tuple") :: Constraint) => Container (a, b) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (a, b) :: Type #

Methods

toList :: (a, b) -> [Element (a, b)] #

null :: (a, b) -> Bool #

foldr :: (Element (a, b) -> b0 -> b0) -> b0 -> (a, b) -> b0 #

foldl :: (b0 -> Element (a, b) -> b0) -> b0 -> (a, b) -> b0 #

foldl' :: (b0 -> Element (a, b) -> b0) -> b0 -> (a, b) -> b0 #

length :: (a, b) -> Int #

elem :: Element (a, b) -> (a, b) -> Bool #

maximum :: (a, b) -> Element (a, b) #

minimum :: (a, b) -> Element (a, b) #

foldMap :: Monoid m => (Element (a, b) -> m) -> (a, b) -> m #

fold :: (a, b) -> Element (a, b) #

foldr' :: (Element (a, b) -> b0 -> b0) -> b0 -> (a, b) -> b0 #

foldr1 :: (Element (a, b) -> Element (a, b) -> Element (a, b)) -> (a, b) -> Element (a, b) #

foldl1 :: (Element (a, b) -> Element (a, b) -> Element (a, b)) -> (a, b) -> Element (a, b) #

notElem :: Element (a, b) -> (a, b) -> Bool #

all :: (Element (a, b) -> Bool) -> (a, b) -> Bool #

any :: (Element (a, b) -> Bool) -> (a, b) -> Bool #

and :: (a, b) -> Bool #

or :: (a, b) -> Bool #

find :: (Element (a, b) -> Bool) -> (a, b) -> Maybe (Element (a, b)) #

safeHead :: (a, b) -> Maybe (Element (a, b)) #

Container (Map k v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Map k v) :: Type #

Methods

toList :: Map k v -> [Element (Map k v)] #

null :: Map k v -> Bool #

foldr :: (Element (Map k v) -> b -> b) -> b -> Map k v -> b #

foldl :: (b -> Element (Map k v) -> b) -> b -> Map k v -> b #

foldl' :: (b -> Element (Map k v) -> b) -> b -> Map k v -> b #

length :: Map k v -> Int #

elem :: Element (Map k v) -> Map k v -> Bool #

maximum :: Map k v -> Element (Map k v) #

minimum :: Map k v -> Element (Map k v) #

foldMap :: Monoid m => (Element (Map k v) -> m) -> Map k v -> m #

fold :: Map k v -> Element (Map k v) #

foldr' :: (Element (Map k v) -> b -> b) -> b -> Map k v -> b #

foldr1 :: (Element (Map k v) -> Element (Map k v) -> Element (Map k v)) -> Map k v -> Element (Map k v) #

foldl1 :: (Element (Map k v) -> Element (Map k v) -> Element (Map k v)) -> Map k v -> Element (Map k v) #

notElem :: Element (Map k v) -> Map k v -> Bool #

all :: (Element (Map k v) -> Bool) -> Map k v -> Bool #

any :: (Element (Map k v) -> Bool) -> Map k v -> Bool #

and :: Map k v -> Bool #

or :: Map k v -> Bool #

find :: (Element (Map k v) -> Bool) -> Map k v -> Maybe (Element (Map k v)) #

safeHead :: Map k v -> Maybe (Element (Map k v)) #

Container (HashMap k v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (HashMap k v) :: Type #

Methods

toList :: HashMap k v -> [Element (HashMap k v)] #

null :: HashMap k v -> Bool #

foldr :: (Element (HashMap k v) -> b -> b) -> b -> HashMap k v -> b #

foldl :: (b -> Element (HashMap k v) -> b) -> b -> HashMap k v -> b #

foldl' :: (b -> Element (HashMap k v) -> b) -> b -> HashMap k v -> b #

length :: HashMap k v -> Int #

elem :: Element (HashMap k v) -> HashMap k v -> Bool #

maximum :: HashMap k v -> Element (HashMap k v) #

minimum :: HashMap k v -> Element (HashMap k v) #

foldMap :: Monoid m => (Element (HashMap k v) -> m) -> HashMap k v -> m #

fold :: HashMap k v -> Element (HashMap k v) #

foldr' :: (Element (HashMap k v) -> b -> b) -> b -> HashMap k v -> b #

foldr1 :: (Element (HashMap k v) -> Element (HashMap k v) -> Element (HashMap k v)) -> HashMap k v -> Element (HashMap k v) #

foldl1 :: (Element (HashMap k v) -> Element (HashMap k v) -> Element (HashMap k v)) -> HashMap k v -> Element (HashMap k v) #

notElem :: Element (HashMap k v) -> HashMap k v -> Bool #

all :: (Element (HashMap k v) -> Bool) -> HashMap k v -> Bool #

any :: (Element (HashMap k v) -> Bool) -> HashMap k v -> Bool #

and :: HashMap k v -> Bool #

or :: HashMap k v -> Bool #

find :: (Element (HashMap k v) -> Bool) -> HashMap k v -> Maybe (Element (HashMap k v)) #

safeHead :: HashMap k v -> Maybe (Element (HashMap k v)) #

Container (Const a b) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Const a b) :: Type #

Methods

toList :: Const a b -> [Element (Const a b)] #

null :: Const a b -> Bool #

foldr :: (Element (Const a b) -> b0 -> b0) -> b0 -> Const a b -> b0 #

foldl :: (b0 -> Element (Const a b) -> b0) -> b0 -> Const a b -> b0 #

foldl' :: (b0 -> Element (Const a b) -> b0) -> b0 -> Const a b -> b0 #

length :: Const a b -> Int #

elem :: Element (Const a b) -> Const a b -> Bool #

maximum :: Const a b -> Element (Const a b) #

minimum :: Const a b -> Element (Const a b) #

foldMap :: Monoid m => (Element (Const a b) -> m) -> Const a b -> m #

fold :: Const a b -> Element (Const a b) #

foldr' :: (Element (Const a b) -> b0 -> b0) -> b0 -> Const a b -> b0 #

foldr1 :: (Element (Const a b) -> Element (Const a b) -> Element (Const a b)) -> Const a b -> Element (Const a b) #

foldl1 :: (Element (Const a b) -> Element (Const a b) -> Element (Const a b)) -> Const a b -> Element (Const a b) #

notElem :: Element (Const a b) -> Const a b -> Bool #

all :: (Element (Const a b) -> Bool) -> Const a b -> Bool #

any :: (Element (Const a b) -> Bool) -> Const a b -> Bool #

and :: Const a b -> Bool #

or :: Const a b -> Bool #

find :: (Element (Const a b) -> Bool) -> Const a b -> Maybe (Element (Const a b)) #

safeHead :: Const a b -> Maybe (Element (Const a b)) #

class One x where #

Associated Types

type OneItem x :: Type #

Methods

one :: OneItem x -> x #

Instances
One ByteString 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem ByteString :: Type #

One ByteString 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem ByteString :: Type #

One IntSet 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem IntSet :: Type #

Methods

one :: OneItem IntSet -> IntSet #

One Text 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem Text :: Type #

Methods

one :: OneItem Text -> Text #

One Text 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem Text :: Type #

Methods

one :: OneItem Text -> Text #

One [a] 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem [a] :: Type #

Methods

one :: OneItem [a] -> [a] #

One (NonEmpty a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (NonEmpty a) :: Type #

Methods

one :: OneItem (NonEmpty a) -> NonEmpty a #

One (IntMap v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (IntMap v) :: Type #

Methods

one :: OneItem (IntMap v) -> IntMap v #

One (Seq a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (Seq a) :: Type #

Methods

one :: OneItem (Seq a) -> Seq a #

One (Set v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (Set v) :: Type #

Methods

one :: OneItem (Set v) -> Set v #

One (Vector a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (Vector a) :: Type #

Methods

one :: OneItem (Vector a) -> Vector a #

Unbox a => One (Vector a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (Vector a) :: Type #

Methods

one :: OneItem (Vector a) -> Vector a #

Prim a => One (Vector a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (Vector a) :: Type #

Methods

one :: OneItem (Vector a) -> Vector a #

Hashable v => One (HashSet v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (HashSet v) :: Type #

Methods

one :: OneItem (HashSet v) -> HashSet v #

Storable a => One (Vector a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (Vector a) :: Type #

Methods

one :: OneItem (Vector a) -> Vector a #

One (Map k v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (Map k v) :: Type #

Methods

one :: OneItem (Map k v) -> Map k v #

Hashable k => One (HashMap k v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (HashMap k v) :: Type #

Methods

one :: OneItem (HashMap k v) -> HashMap k v #

class ToPairs t where #

Minimal complete definition

toPairs

Associated Types

type Key t :: Type #

type Val t :: Type #

Methods

toPairs :: t -> [(Key t, Val t)] #

keys :: t -> [Key t] #

elems :: t -> [Val t] #

Instances
ToPairs (IntMap v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Key (IntMap v) :: Type #

type Val (IntMap v) :: Type #

Methods

toPairs :: IntMap v -> [(Key (IntMap v), Val (IntMap v))] #

keys :: IntMap v -> [Key (IntMap v)] #

elems :: IntMap v -> [Val (IntMap v)] #

ToPairs (Map k v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Key (Map k v) :: Type #

type Val (Map k v) :: Type #

Methods

toPairs :: Map k v -> [(Key (Map k v), Val (Map k v))] #

keys :: Map k v -> [Key (Map k v)] #

elems :: Map k v -> [Val (Map k v)] #

ToPairs (HashMap k v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Key (HashMap k v) :: Type #

type Val (HashMap k v) :: Type #

Methods

toPairs :: HashMap k v -> [(Key (HashMap k v), Val (HashMap k v))] #

keys :: HashMap k v -> [Key (HashMap k v)] #

elems :: HashMap k v -> [Val (HashMap k v)] #

data Undefined #

Constructors

Undefined 
Instances
Bounded Undefined 
Instance details

Defined in Universum.Debug

Enum Undefined 
Instance details

Defined in Universum.Debug

Eq Undefined 
Instance details

Defined in Universum.Debug

Data Undefined 
Instance details

Defined in Universum.Debug

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Undefined -> c Undefined #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Undefined #

toConstr :: Undefined -> Constr #

dataTypeOf :: Undefined -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Undefined) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Undefined) #

gmapT :: (forall b. Data b => b -> b) -> Undefined -> Undefined #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Undefined -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Undefined -> r #

gmapQ :: (forall d. Data d => d -> u) -> Undefined -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Undefined -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Undefined -> m Undefined #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Undefined -> m Undefined #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Undefined -> m Undefined #

Ord Undefined 
Instance details

Defined in Universum.Debug

Read Undefined 
Instance details

Defined in Universum.Debug

Show Undefined 
Instance details

Defined in Universum.Debug

Generic Undefined 
Instance details

Defined in Universum.Debug

Associated Types

type Rep Undefined :: Type -> Type #

type Rep Undefined 
Instance details

Defined in Universum.Debug

type Rep Undefined = D1 (MetaData "Undefined" "Universum.Debug" "universum-1.5.0-9e427f466f916556e8f9c266a705a2fc863c228a7c7382fe2a18a88737969816" False) (C1 (MetaCons "Undefined" PrefixI False) (U1 :: Type -> Type))

data Bug #

Instances
Show Bug 
Instance details

Defined in Universum.Exception

Methods

showsPrec :: Int -> Bug -> ShowS #

show :: Bug -> String #

showList :: [Bug] -> ShowS #

Exception Bug 
Instance details

Defined in Universum.Exception

class Print a #

Minimal complete definition

hPutStr, hPutStrLn

Instances
Print ByteString 
Instance details

Defined in Universum.Print.Internal

Methods

hPutStr :: Handle -> ByteString -> IO ()

hPutStrLn :: Handle -> ByteString -> IO ()

Print ByteString 
Instance details

Defined in Universum.Print.Internal

Methods

hPutStr :: Handle -> ByteString -> IO ()

hPutStrLn :: Handle -> ByteString -> IO ()

Print Text 
Instance details

Defined in Universum.Print.Internal

Methods

hPutStr :: Handle -> Text -> IO ()

hPutStrLn :: Handle -> Text -> IO ()

Print Text 
Instance details

Defined in Universum.Print.Internal

Methods

hPutStr :: Handle -> Text -> IO ()

hPutStrLn :: Handle -> Text -> IO ()

Print [Char] 
Instance details

Defined in Universum.Print.Internal

Methods

hPutStr :: Handle -> [Char] -> IO ()

hPutStrLn :: Handle -> [Char] -> IO ()

class ConvertUtf8 a b where #

Methods

encodeUtf8 :: a -> b #

decodeUtf8 :: b -> a #

decodeUtf8Strict :: b -> Either UnicodeException a #

type LText = Text #

class ToLText a where #

Methods

toLText :: a -> Text #

Instances
ToLText String 
Instance details

Defined in Universum.String.Conversion

Methods

toLText :: String -> Text #

ToLText Text 
Instance details

Defined in Universum.String.Conversion

Methods

toLText :: Text -> Text #

ToLText Text 
Instance details

Defined in Universum.String.Conversion

Methods

toLText :: Text -> Text0 #

class ToString a where #

Methods

toString :: a -> String #

Instances
ToString String 
Instance details

Defined in Universum.String.Conversion

Methods

toString :: String -> String #

ToString Text 
Instance details

Defined in Universum.String.Conversion

Methods

toString :: Text -> String #

ToString Text 
Instance details

Defined in Universum.String.Conversion

Methods

toString :: Text -> String #

class ToText a where #

Methods

toText :: a -> Text #

Instances
ToText String 
Instance details

Defined in Universum.String.Conversion

Methods

toText :: String -> Text #

ToText Text 
Instance details

Defined in Universum.String.Conversion

Methods

toText :: Text -> Text0 #

ToText Text 
Instance details

Defined in Universum.String.Conversion

Methods

toText :: Text -> Text #

type ($) (f :: k -> k1) (a :: k) = f a #

type family Each (c :: [k -> Constraint]) (as :: [k]) :: Constraint where ... #

Equations

Each (c :: [k -> Constraint]) ([] :: [k]) = () 
Each (c :: [k -> Constraint]) (h ': t :: [k]) = (c <+> h, Each c t) 

type With (a :: [k -> Constraint]) (b :: k) = a <+> b #

class SuperComposition a b c | a b -> c where #

Methods

(...) :: a -> b -> c #

Instances
(a ~ c, r ~ b) => SuperComposition (a -> b) c r 
Instance details

Defined in Universum.VarArg

Methods

(...) :: (a -> b) -> c -> r #

(SuperComposition (a -> b) d r1, r ~ (c -> r1)) => SuperComposition (a -> b) (c -> d) r 
Instance details

Defined in Universum.VarArg

Methods

(...) :: (a -> b) -> (c -> d) -> r #

data HashMap k v #

Instances
Eq2 HashMap 
Instance details

Defined in Data.HashMap.Base

Methods

liftEq2 :: (a -> b -> Bool) -> (c -> d -> Bool) -> HashMap a c -> HashMap b d -> Bool #

Ord2 HashMap 
Instance details

Defined in Data.HashMap.Base

Methods

liftCompare2 :: (a -> b -> Ordering) -> (c -> d -> Ordering) -> HashMap a c -> HashMap b d -> Ordering #

Show2 HashMap 
Instance details

Defined in Data.HashMap.Base

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 #

KeyValue Object 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

(.=) :: ToJSON v => Text -> v -> Object

ToObject Object 
Instance details

Defined in Katip.Core

Methods

toObject :: Object -> Object

Hashable2 HashMap 
Instance details

Defined in Data.HashMap.Base

Methods

liftHashWithSalt2 :: (Int -> a -> Int) -> (Int -> b -> Int) -> Int -> HashMap a b -> Int

Functor (HashMap k) 
Instance details

Defined in Data.HashMap.Base

Methods

fmap :: (a -> b) -> HashMap k a -> HashMap k b #

(<$) :: a -> HashMap k b -> HashMap k a #

Foldable (HashMap k) 
Instance details

Defined in Data.HashMap.Base

Methods

fold :: Monoid m => HashMap k m -> 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 #

Traversable (HashMap k) 
Instance details

Defined in Data.HashMap.Base

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) #

Eq k => Eq1 (HashMap k) 
Instance details

Defined in Data.HashMap.Base

Methods

liftEq :: (a -> b -> Bool) -> HashMap k a -> HashMap k b -> Bool #

Ord k => Ord1 (HashMap k) 
Instance details

Defined in Data.HashMap.Base

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.Base

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.Base

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> HashMap k a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [HashMap k a] -> ShowS #

(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

Hashable k => Hashable1 (HashMap k) 
Instance details

Defined in Data.HashMap.Base

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> HashMap k a -> Int

(Eq k, Hashable k) => IsList (HashMap k v) 
Instance details

Defined in Data.HashMap.Base

Associated Types

type Item (HashMap k v) :: Type #

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, Eq v) => Eq (HashMap k v) 
Instance details

Defined in Data.HashMap.Base

Methods

(==) :: HashMap k v -> HashMap k v -> Bool #

(/=) :: HashMap k v -> HashMap k v -> Bool #

(Data k, Data v, Eq k, Hashable k) => Data (HashMap k v) 
Instance details

Defined in Data.HashMap.Base

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 :: (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) #

(Ord k, Ord v) => Ord (HashMap k v) 
Instance details

Defined in Data.HashMap.Base

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 #

(Eq k, Hashable k, Read k, Read e) => Read (HashMap k e) 
Instance details

Defined in Data.HashMap.Base

(Show k, Show v) => Show (HashMap k v) 
Instance details

Defined in Data.HashMap.Base

Methods

showsPrec :: Int -> HashMap k v -> ShowS #

show :: HashMap k v -> String #

showList :: [HashMap k v] -> ShowS #

(Eq k, Hashable k) => Semigroup (HashMap k v) 
Instance details

Defined in Data.HashMap.Base

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) => Monoid (HashMap k v) 
Instance details

Defined in Data.HashMap.Base

Methods

mempty :: HashMap k v #

mappend :: HashMap k v -> HashMap k v -> HashMap k v #

mconcat :: [HashMap k v] -> HashMap k v #

(NFData k, NFData v) => NFData (HashMap k v) 
Instance details

Defined in Data.HashMap.Base

Methods

rnf :: HashMap k v -> () #

(FromJSON v, FromJSONKey k, Eq k, Hashable k) => FromJSON (HashMap k v) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (HashMap k v) #

parseJSONList :: Value -> Parser [HashMap k v] #

(Hashable k, Hashable v) => Hashable (HashMap k v) 
Instance details

Defined in Data.HashMap.Base

Methods

hashWithSalt :: Int -> HashMap k v -> Int #

hash :: HashMap k v -> Int

(ToJSON v, ToJSONKey k) => ToJSON (HashMap k v) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: HashMap k v -> Value

toEncoding :: HashMap k v -> Encoding

toJSONList :: [HashMap k v] -> Value

toEncodingList :: [HashMap k v] -> Encoding

Container (HashMap k v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (HashMap k v) :: Type #

Methods

toList :: HashMap k v -> [Element (HashMap k v)] #

null :: HashMap k v -> Bool #

foldr :: (Element (HashMap k v) -> b -> b) -> b -> HashMap k v -> b #

foldl :: (b -> Element (HashMap k v) -> b) -> b -> HashMap k v -> b #

foldl' :: (b -> Element (HashMap k v) -> b) -> b -> HashMap k v -> b #

length :: HashMap k v -> Int #

elem :: Element (HashMap k v) -> HashMap k v -> Bool #

maximum :: HashMap k v -> Element (HashMap k v) #

minimum :: HashMap k v -> Element (HashMap k v) #

foldMap :: Monoid m => (Element (HashMap k v) -> m) -> HashMap k v -> m #

fold :: HashMap k v -> Element (HashMap k v) #

foldr' :: (Element (HashMap k v) -> b -> b) -> b -> HashMap k v -> b #

foldr1 :: (Element (HashMap k v) -> Element (HashMap k v) -> Element (HashMap k v)) -> HashMap k v -> Element (HashMap k v) #

foldl1 :: (Element (HashMap k v) -> Element (HashMap k v) -> Element (HashMap k v)) -> HashMap k v -> Element (HashMap k v) #

notElem :: Element (HashMap k v) -> HashMap k v -> Bool #

all :: (Element (HashMap k v) -> Bool) -> HashMap k v -> Bool #

any :: (Element (HashMap k v) -> Bool) -> HashMap k v -> Bool #

and :: HashMap k v -> Bool #

or :: HashMap k v -> Bool #

find :: (Element (HashMap k v) -> Bool) -> HashMap k v -> Maybe (Element (HashMap k v)) #

safeHead :: HashMap k v -> Maybe (Element (HashMap k v)) #

Hashable k => One (HashMap k v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (HashMap k v) :: Type #

Methods

one :: OneItem (HashMap k v) -> HashMap k v #

ToPairs (HashMap k v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Key (HashMap k v) :: Type #

type Val (HashMap k v) :: Type #

Methods

toPairs :: HashMap k v -> [(Key (HashMap k v), Val (HashMap k v))] #

keys :: HashMap k v -> [Key (HashMap k v)] #

elems :: HashMap k v -> [Val (HashMap k v)] #

type Item (HashMap k v) 
Instance details

Defined in Data.HashMap.Base

type Item (HashMap k v) = (k, v)
type Element (HashMap k v) 
Instance details

Defined in Universum.Container.Class

type Element (HashMap k v) = ElementDefault (HashMap k v)
type OneItem (HashMap k v) 
Instance details

Defined in Universum.Container.Class

type OneItem (HashMap k v) = (k, v)
type Key (HashMap k v) 
Instance details

Defined in Universum.Container.Class

type Key (HashMap k v) = k
type Val (HashMap k v) 
Instance details

Defined in Universum.Container.Class

type Val (HashMap k v) = v

data HashSet a #

Instances
Foldable HashSet 
Instance details

Defined in Data.HashSet.Base

Methods

fold :: Monoid m => HashSet m -> 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.Base

Methods

liftEq :: (a -> b -> Bool) -> HashSet a -> HashSet b -> Bool #

Ord1 HashSet 
Instance details

Defined in Data.HashSet.Base

Methods

liftCompare :: (a -> b -> Ordering) -> HashSet a -> HashSet b -> Ordering #

Show1 HashSet 
Instance details

Defined in Data.HashSet.Base

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> HashSet a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [HashSet a] -> ShowS #

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

Hashable1 HashSet 
Instance details

Defined in Data.HashSet.Base

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> HashSet a -> Int

(Eq a, Hashable a) => IsList (HashSet a) 
Instance details

Defined in Data.HashSet.Base

Associated Types

type Item (HashSet a) :: Type #

Methods

fromList :: [Item (HashSet a)] -> HashSet a #

fromListN :: Int -> [Item (HashSet a)] -> HashSet a #

toList :: HashSet a -> [Item (HashSet a)] #

Eq a => Eq (HashSet a) 
Instance details

Defined in Data.HashSet.Base

Methods

(==) :: HashSet a -> HashSet a -> Bool #

(/=) :: HashSet a -> HashSet a -> Bool #

(Data a, Eq a, Hashable a) => Data (HashSet a) 
Instance details

Defined in Data.HashSet.Base

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 :: (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) #

Ord a => Ord (HashSet a) 
Instance details

Defined in Data.HashSet.Base

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 #

(Eq a, Hashable a, Read a) => Read (HashSet a) 
Instance details

Defined in Data.HashSet.Base

Show a => Show (HashSet a) 
Instance details

Defined in Data.HashSet.Base

Methods

showsPrec :: Int -> HashSet a -> ShowS #

show :: HashSet a -> String #

showList :: [HashSet a] -> ShowS #

(Hashable a, Eq a) => Semigroup (HashSet a) 
Instance details

Defined in Data.HashSet.Base

Methods

(<>) :: HashSet a -> HashSet a -> HashSet a #

sconcat :: NonEmpty (HashSet a) -> HashSet a #

stimes :: Integral b => b -> HashSet a -> HashSet a #

(Hashable a, Eq a) => Monoid (HashSet a) 
Instance details

Defined in Data.HashSet.Base

Methods

mempty :: HashSet a #

mappend :: HashSet a -> HashSet a -> HashSet a #

mconcat :: [HashSet a] -> HashSet a #

NFData a => NFData (HashSet a) 
Instance details

Defined in Data.HashSet.Base

Methods

rnf :: HashSet a -> () #

(Eq a, Hashable a, FromJSON a) => FromJSON (HashSet a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (HashSet a) #

parseJSONList :: Value -> Parser [HashSet a] #

Hashable a => Hashable (HashSet a) 
Instance details

Defined in Data.HashSet.Base

Methods

hashWithSalt :: Int -> HashSet a -> Int #

hash :: HashSet a -> Int

ToJSON a => ToJSON (HashSet a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: HashSet a -> Value

toEncoding :: HashSet a -> Encoding

toJSONList :: [HashSet a] -> Value

toEncodingList :: [HashSet a] -> Encoding

(Eq v, Hashable v) => Container (HashSet v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (HashSet v) :: Type #

Methods

toList :: HashSet v -> [Element (HashSet v)] #

null :: HashSet v -> Bool #

foldr :: (Element (HashSet v) -> b -> b) -> b -> HashSet v -> b #

foldl :: (b -> Element (HashSet v) -> b) -> b -> HashSet v -> b #

foldl' :: (b -> Element (HashSet v) -> b) -> b -> HashSet v -> b #

length :: HashSet v -> Int #

elem :: Element (HashSet v) -> HashSet v -> Bool #

maximum :: HashSet v -> Element (HashSet v) #

minimum :: HashSet v -> Element (HashSet v) #

foldMap :: Monoid m => (Element (HashSet v) -> m) -> HashSet v -> m #

fold :: HashSet v -> Element (HashSet v) #

foldr' :: (Element (HashSet v) -> b -> b) -> b -> HashSet v -> b #

foldr1 :: (Element (HashSet v) -> Element (HashSet v) -> Element (HashSet v)) -> HashSet v -> Element (HashSet v) #

foldl1 :: (Element (HashSet v) -> Element (HashSet v) -> Element (HashSet v)) -> HashSet v -> Element (HashSet v) #

notElem :: Element (HashSet v) -> HashSet v -> Bool #

all :: (Element (HashSet v) -> Bool) -> HashSet v -> Bool #

any :: (Element (HashSet v) -> Bool) -> HashSet v -> Bool #

and :: HashSet v -> Bool #

or :: HashSet v -> Bool #

find :: (Element (HashSet v) -> Bool) -> HashSet v -> Maybe (Element (HashSet v)) #

safeHead :: HashSet v -> Maybe (Element (HashSet v)) #

Hashable v => One (HashSet v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (HashSet v) :: Type #

Methods

one :: OneItem (HashSet v) -> HashSet v #

type Item (HashSet a) 
Instance details

Defined in Data.HashSet.Base

type Item (HashSet a) = a
type Element (HashSet v) 
Instance details

Defined in Universum.Container.Class

type Element (HashSet v) = ElementDefault (HashSet v)
type OneItem (HashSet v) 
Instance details

Defined in Universum.Container.Class

type OneItem (HashSet v) = v

class MonadIO m => MonadUnliftIO (m :: Type -> Type) where #

Minimal complete definition

askUnliftIO | withRunInIO

Methods

askUnliftIO :: m (UnliftIO m) #

withRunInIO :: ((forall a. m a -> IO a) -> IO b) -> m b #

Instances
MonadUnliftIO IO 
Instance details

Defined in Control.Monad.IO.Unlift

Methods

askUnliftIO :: IO (UnliftIO IO) #

withRunInIO :: ((forall a. IO a -> IO a) -> IO b) -> IO b #

MonadUnliftIO m => MonadUnliftIO (KatipT m) 
Instance details

Defined in Katip.Core

Methods

askUnliftIO :: KatipT m (UnliftIO (KatipT m)) #

withRunInIO :: ((forall a. KatipT m a -> IO a) -> IO b) -> KatipT m b #

MonadUnliftIO m => MonadUnliftIO (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

askUnliftIO :: KatipContextT m (UnliftIO (KatipContextT m)) #

withRunInIO :: ((forall a. KatipContextT m a -> IO a) -> IO b) -> KatipContextT m b #

MonadUnliftIO m => MonadUnliftIO (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

askUnliftIO :: ResourceT m (UnliftIO (ResourceT m)) #

withRunInIO :: ((forall a. ResourceT m a -> IO a) -> IO b) -> ResourceT m b #

MonadUnliftIO m => MonadUnliftIO (NoLoggingT m) 
Instance details

Defined in Katip.Monadic

Methods

askUnliftIO :: NoLoggingT m (UnliftIO (NoLoggingT m)) #

withRunInIO :: ((forall a. NoLoggingT m a -> IO a) -> IO b) -> NoLoggingT m b #

MonadUnliftIO m => MonadUnliftIO (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

askUnliftIO :: LoggingT m (UnliftIO (LoggingT m)) #

withRunInIO :: ((forall a. LoggingT m a -> IO a) -> IO b) -> LoggingT m b #

MonadUnliftIO m => MonadUnliftIO (NoLoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

askUnliftIO :: NoLoggingT m (UnliftIO (NoLoggingT m)) #

withRunInIO :: ((forall a. NoLoggingT m a -> IO a) -> IO b) -> NoLoggingT m b #

MonadUnliftIO m => MonadUnliftIO (IdentityT m) 
Instance details

Defined in Control.Monad.IO.Unlift

Methods

askUnliftIO :: IdentityT m (UnliftIO (IdentityT m)) #

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

askUnliftIO :: ReaderT r m (UnliftIO (ReaderT r m)) #

withRunInIO :: ((forall a. ReaderT r m a -> IO a) -> IO b) -> ReaderT r m b #

newtype UnliftIO (m :: Type -> Type) #

Constructors

UnliftIO 

Fields