btc-lsp-0.1.0.0: Lightning service provider
Safe HaskellSafe-Inferred
LanguageHaskell2010

BtcLsp.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 :: forall {r :: RuntimeRep} a (b :: TYPE r). a -> b -> b infixr 0 #

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

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

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

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

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

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

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

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

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

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

zip is right-lazy:

>>> zip [] _|_
[]
>>> zip _|_ []
_|_

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

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

Extract the first component of a pair.

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

Extract the second component of a pair.

otherwise :: Bool #

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

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

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

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

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

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

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

coerce :: forall {k :: RuntimeRep} (a :: TYPE k) (b :: TYPE k). 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.

This function is runtime-representation polymorphic, but the RuntimeRep type argument is marked as Inferred, meaning that it is not available for visible type application. This means the typechecker will accept coerce @Int @Age 42.

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)

class IsList l #

The IsList class and its methods are intended to be used in conjunction with the OverloadedLists extension.

Since: base-4.7.0.0

Minimal complete definition

fromList, toList

Instances

Instances details
IsList Version

Since: base-4.8.0.0

Instance details

Defined in GHC.Exts

Associated Types

type Item Version #

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 #

IsList String 
Instance details

Defined in Basement.UTF8.Base

Associated Types

type Item String #

IsList HtmlClassAttr Source # 
Instance details

Defined in BtcLsp.Yesod.Data.Widget

Associated Types

type Item HtmlClassAttr #

IsList Bytes 
Instance details

Defined in Data.Bytes.Internal

Associated Types

type Item Bytes #

IsList ByteString

Since: bytestring-0.10.12.0

Instance details

Defined in Data.ByteString.Internal

Associated Types

type Item ByteString #

IsList ByteString

Since: bytestring-0.10.12.0

Instance details

Defined in Data.ByteString.Lazy.Internal

Associated Types

type Item ByteString #

IsList ShortByteString

Since: bytestring-0.10.12.0

Instance details

Defined in Data.ByteString.Short.Internal

Associated Types

type Item ShortByteString #

IsList IntSet

Since: containers-0.5.6.2

Instance details

Defined in Data.IntSet.Internal

Associated Types

type Item IntSet #

IsList ByteArray

Since: primitive-0.6.3.0

Instance details

Defined in Data.Primitive.ByteArray

Associated Types

type Item ByteArray #

IsList ShortText

Note: Surrogate pairs ([U+D800 .. U+DFFF]) character literals are replaced by U+FFFD.

Since: text-short-0.1.2

Instance details

Defined in Data.Text.Short.Internal

Associated Types

type Item ShortText #

IsList (ZipList a)

Since: base-4.15.0.0

Instance details

Defined in GHC.Exts

Associated Types

type Item (ZipList a) #

Methods

fromList :: [Item (ZipList a)] -> ZipList a #

fromListN :: Int -> [Item (ZipList a)] -> ZipList a #

toList :: ZipList a -> [Item (ZipList a)] #

IsList (NonEmpty a)

Since: base-4.9.0.0

Instance details

Defined in GHC.Exts

Associated Types

type Item (NonEmpty a) #

Methods

fromList :: [Item (NonEmpty a)] -> NonEmpty a #

fromListN :: Int -> [Item (NonEmpty a)] -> NonEmpty a #

toList :: NonEmpty a -> [Item (NonEmpty a)] #

PrimType ty => IsList (Block ty) 
Instance details

Defined in Basement.Block.Base

Associated Types

type Item (Block ty) #

Methods

fromList :: [Item (Block ty)] -> Block ty #

fromListN :: Int -> [Item (Block ty)] -> Block ty #

toList :: Block ty -> [Item (Block ty)] #

IsList c => IsList (NonEmpty c) 
Instance details

Defined in Basement.NonEmpty

Associated Types

type Item (NonEmpty c) #

Methods

fromList :: [Item (NonEmpty c)] -> NonEmpty c #

fromListN :: Int -> [Item (NonEmpty c)] -> NonEmpty c #

toList :: NonEmpty c -> [Item (NonEmpty c)] #

PrimType ty => IsList (UArray ty) 
Instance details

Defined in Basement.UArray.Base

Associated Types

type Item (UArray ty) #

Methods

fromList :: [Item (UArray ty)] -> UArray ty #

fromListN :: Int -> [Item (UArray ty)] -> UArray ty #

toList :: UArray ty -> [Item (UArray ty)] #

IsList (IntMap a)

Since: containers-0.5.6.2

Instance details

Defined in Data.IntMap.Internal

Associated Types

type Item (IntMap a) #

Methods

fromList :: [Item (IntMap a)] -> IntMap a #

fromListN :: Int -> [Item (IntMap a)] -> IntMap a #

toList :: IntMap a -> [Item (IntMap a)] #

IsList (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Associated Types

type Item (Seq a) #

Methods

fromList :: [Item (Seq a)] -> Seq a #

fromListN :: Int -> [Item (Seq a)] -> Seq a #

toList :: Seq a -> [Item (Seq a)] #

Ord a => IsList (Set a)

Since: containers-0.5.6.2

Instance details

Defined in Data.Set.Internal

Associated Types

type Item (Set a) #

Methods

fromList :: [Item (Set a)] -> Set a #

fromListN :: Int -> [Item (Set a)] -> Set a #

toList :: Set a -> [Item (Set a)] #

IsList (DNonEmpty a) 
Instance details

Defined in Data.DList.DNonEmpty.Internal

Associated Types

type Item (DNonEmpty a) #

Methods

fromList :: [Item (DNonEmpty a)] -> DNonEmpty a #

fromListN :: Int -> [Item (DNonEmpty a)] -> DNonEmpty a #

toList :: DNonEmpty a -> [Item (DNonEmpty a)] #

IsList (DList a) 
Instance details

Defined in Data.DList.Internal

Associated Types

type Item (DList a) #

Methods

fromList :: [Item (DList a)] -> DList a #

fromListN :: Int -> [Item (DList a)] -> DList a #

toList :: DList a -> [Item (DList a)] #

IsList (Array a) 
Instance details

Defined in Data.Primitive.Array

Associated Types

type Item (Array a) #

Methods

fromList :: [Item (Array a)] -> Array a #

fromListN :: Int -> [Item (Array a)] -> Array a #

toList :: Array a -> [Item (Array a)] #

Prim a => IsList (PrimArray a)

Since: primitive-0.6.4.0

Instance details

Defined in Data.Primitive.PrimArray

Associated Types

type Item (PrimArray a) #

Methods

fromList :: [Item (PrimArray a)] -> PrimArray a #

fromListN :: Int -> [Item (PrimArray a)] -> PrimArray a #

toList :: PrimArray a -> [Item (PrimArray a)] #

IsList (SmallArray a) 
Instance details

Defined in Data.Primitive.SmallArray

Associated Types

type Item (SmallArray a) #

PrimUnlifted a => IsList (UnliftedArray a) 
Instance details

Defined in Data.Primitive.Unlifted.Array

Associated Types

type Item (UnliftedArray a) #

(Eq a, Hashable a) => IsList (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Associated Types

type Item (HashSet a) #

Methods

fromList :: [Item (HashSet a)] -> HashSet a #

fromListN :: Int -> [Item (HashSet a)] -> HashSet a #

toList :: HashSet a -> [Item (HashSet a)] #

IsList (Vector a) 
Instance details

Defined in Data.Vector

Associated Types

type Item (Vector a) #

Methods

fromList :: [Item (Vector a)] -> Vector a #

fromListN :: Int -> [Item (Vector a)] -> Vector a #

toList :: Vector a -> [Item (Vector a)] #

Prim a => IsList (Vector a) 
Instance details

Defined in Data.Vector.Primitive

Associated Types

type Item (Vector a) #

Methods

fromList :: [Item (Vector a)] -> Vector a #

fromListN :: Int -> [Item (Vector a)] -> Vector a #

toList :: Vector a -> [Item (Vector a)] #

Storable a => IsList (Vector a) 
Instance details

Defined in Data.Vector.Storable

Associated Types

type Item (Vector a) #

Methods

fromList :: [Item (Vector a)] -> Vector a #

fromListN :: Int -> [Item (Vector a)] -> Vector a #

toList :: Vector a -> [Item (Vector a)] #

IsList [a]

Since: base-4.7.0.0

Instance details

Defined in GHC.Exts

Associated Types

type Item [a] #

Methods

fromList :: [Item [a]] -> [a] #

fromListN :: Int -> [Item [a]] -> [a] #

toList :: [a] -> [Item [a]] #

Ord k => IsList (Map k v)

Since: containers-0.5.6.2

Instance details

Defined in Data.Map.Internal

Associated Types

type Item (Map k v) #

Methods

fromList :: [Item (Map k v)] -> Map k v #

fromListN :: Int -> [Item (Map k v)] -> Map k v #

toList :: Map k v -> [Item (Map k v)] #

(Eq k, Hashable k) => IsList (HashMap k v) 
Instance details

Defined in Data.HashMap.Internal

Associated Types

type Item (HashMap k v) #

Methods

fromList :: [Item (HashMap k v)] -> HashMap k v #

fromListN :: Int -> [Item (HashMap k v)] -> HashMap k v #

toList :: HashMap k v -> [Item (HashMap k v)] #

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

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

'join bss' can be understood as the do expression

do bs <- bss
   bs

Examples

Expand

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

atomically :: STM a -> IO a

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

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

we can compose them as

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

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

class Bounded a where #

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

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

Methods

minBound :: a #

maxBound :: a #

Instances

Instances details
Bounded All

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

minBound :: All #

maxBound :: All #

Bounded Any

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

minBound :: Any #

maxBound :: Any #

Bounded CBool 
Instance details

Defined in Foreign.C.Types

Bounded CChar 
Instance details

Defined in Foreign.C.Types

Bounded CInt 
Instance details

Defined in Foreign.C.Types

Bounded CIntMax 
Instance details

Defined in Foreign.C.Types

Bounded CIntPtr 
Instance details

Defined in Foreign.C.Types

Bounded CLLong 
Instance details

Defined in Foreign.C.Types

Bounded CLong 
Instance details

Defined in Foreign.C.Types

Bounded CPtrdiff 
Instance details

Defined in Foreign.C.Types

Bounded CSChar 
Instance details

Defined in Foreign.C.Types

Bounded CShort 
Instance details

Defined in Foreign.C.Types

Bounded CSigAtomic 
Instance details

Defined in Foreign.C.Types

Bounded CSize 
Instance details

Defined in Foreign.C.Types

Bounded CUChar 
Instance details

Defined in Foreign.C.Types

Bounded CUInt 
Instance details

Defined in Foreign.C.Types

Bounded CUIntMax 
Instance details

Defined in Foreign.C.Types

Bounded CUIntPtr 
Instance details

Defined in Foreign.C.Types

Bounded CULLong 
Instance details

Defined in Foreign.C.Types

Bounded CULong 
Instance details

Defined in Foreign.C.Types

Bounded CUShort 
Instance details

Defined in Foreign.C.Types

Bounded CWchar 
Instance details

Defined in Foreign.C.Types

Bounded Associativity

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Bounded DecidedStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Bounded SourceStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Bounded SourceUnpackedness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Bounded Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Bounded Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Bounded Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Bounded Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Bounded 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 CBlkCnt 
Instance details

Defined in System.Posix.Types

Bounded CBlkSize 
Instance details

Defined in System.Posix.Types

Bounded CClockId 
Instance details

Defined in System.Posix.Types

Bounded CDev 
Instance details

Defined in System.Posix.Types

Bounded CFsBlkCnt 
Instance details

Defined in System.Posix.Types

Bounded CFsFilCnt 
Instance details

Defined in System.Posix.Types

Bounded CGid 
Instance details

Defined in System.Posix.Types

Bounded CId 
Instance details

Defined in System.Posix.Types

Methods

minBound :: CId #

maxBound :: CId #

Bounded CIno 
Instance details

Defined in System.Posix.Types

Bounded CKey 
Instance details

Defined in System.Posix.Types

Bounded CMode 
Instance details

Defined in System.Posix.Types

Bounded CNfds 
Instance details

Defined in System.Posix.Types

Bounded CNlink 
Instance details

Defined in System.Posix.Types

Bounded COff 
Instance details

Defined in System.Posix.Types

Bounded CPid 
Instance details

Defined in System.Posix.Types

Bounded CRLim 
Instance details

Defined in System.Posix.Types

Bounded CSocklen 
Instance details

Defined in System.Posix.Types

Bounded CSsize 
Instance details

Defined in System.Posix.Types

Bounded CTcflag 
Instance details

Defined in System.Posix.Types

Bounded CUid 
Instance details

Defined in System.Posix.Types

Bounded Fd 
Instance details

Defined in System.Posix.Types

Methods

minBound :: Fd #

maxBound :: Fd #

Bounded Encoding 
Instance details

Defined in Basement.String

Bounded UTF32_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF32

Methods

minBound :: UTF32_Invalid #

maxBound :: UTF32_Invalid #

Bounded Table Source # 
Instance details

Defined in BtcLsp.Data.Kind

Bounded Privacy Source # 
Instance details

Defined in BtcLsp.Data.Type

Bounded SwapStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Bounded Encryption Source # 
Instance details

Defined in BtcLsp.Grpc.Data

Bounded Code Source # 
Instance details

Defined in BtcLsp.Yesod.Data.Language

Bounded Layout Source # 
Instance details

Defined in BtcLsp.Yesod.Data.Widget

Bounded InputFailureKind Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Bounded Privacy Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Bounded Response'Failure'InputFailure Source # 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Bounded Response'Failure'InputFailure Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Bounded Response'Failure'InputFailure Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Bounded Month

Month starts at 0 and ends at 11 (January to December)

Instance details

Defined in Chronos

Bounded OffsetFormat 
Instance details

Defined in Chronos

Bounded Time 
Instance details

Defined in Chronos

Bounded TimeInterval 
Instance details

Defined in Chronos

Bounded TimeSpec 
Instance details

Defined in System.Clock

Bounded Extension 
Instance details

Defined in GHC.LanguageExtensions.Type

Bounded Ordering

Since: base-2.1

Instance details

Defined in GHC.Enum

Bounded StdMethod 
Instance details

Defined in Network.HTTP.Types.Method

Bounded Status 
Instance details

Defined in Network.HTTP.Types.Status

Bounded SettingsKeyId 
Instance details

Defined in Network.HTTP2.Frame.Types

Bounded IPv4 
Instance details

Defined in Data.IP.Addr

Bounded IPv6 
Instance details

Defined in Data.IP.Addr

Bounded Severity 
Instance details

Defined in Katip.Core

Bounded Verbosity 
Instance details

Defined in Katip.Core

Bounded LoggingMeta 
Instance details

Defined in LndClient.Data.Type

Methods

minBound :: LoggingMeta #

maxBound :: LoggingMeta #

Bounded LookupModifier 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

minBound :: LookupModifier #

maxBound :: LookupModifier #

Bounded AddressType 
Instance details

Defined in Proto.Lightning

Methods

minBound :: AddressType #

maxBound :: AddressType #

Bounded Peer'SyncType 
Instance details

Defined in Proto.Lightning

Methods

minBound :: Peer'SyncType #

maxBound :: Peer'SyncType #

Bounded PeerEvent'EventType 
Instance details

Defined in Proto.Lightning

Methods

minBound :: PeerEvent'EventType #

maxBound :: PeerEvent'EventType #

Bounded ChannelCloseSummary'ClosureType 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

minBound :: ChannelCloseSummary'ClosureType #

maxBound :: ChannelCloseSummary'ClosureType #

Bounded ChannelEventUpdate'UpdateType 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

minBound :: ChannelEventUpdate'UpdateType #

maxBound :: ChannelEventUpdate'UpdateType #

Bounded CommitmentType 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

minBound :: CommitmentType #

maxBound :: CommitmentType #

Bounded FeatureBit 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

minBound :: FeatureBit #

maxBound :: FeatureBit #

Bounded Initiator 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

minBound :: Initiator #

maxBound :: Initiator #

Bounded NodeMetricType 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

minBound :: NodeMetricType #

maxBound :: NodeMetricType #

Bounded PendingChannelsResponse'ForceClosedChannel'AnchorState 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

minBound :: PendingChannelsResponse'ForceClosedChannel'AnchorState #

maxBound :: PendingChannelsResponse'ForceClosedChannel'AnchorState #

Bounded ResolutionOutcome 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

minBound :: ResolutionOutcome #

maxBound :: ResolutionOutcome #

Bounded ResolutionType 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

minBound :: ResolutionType #

maxBound :: ResolutionType #

Bounded Failure'FailureCode 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

minBound :: Failure'FailureCode #

maxBound :: Failure'FailureCode #

Bounded HTLCAttempt'HTLCStatus 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

minBound :: HTLCAttempt'HTLCStatus #

maxBound :: HTLCAttempt'HTLCStatus #

Bounded Invoice'InvoiceState 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

minBound :: Invoice'InvoiceState #

maxBound :: Invoice'InvoiceState #

Bounded InvoiceHTLCState 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

minBound :: InvoiceHTLCState #

maxBound :: InvoiceHTLCState #

Bounded Payment'PaymentStatus 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

minBound :: Payment'PaymentStatus #

maxBound :: Payment'PaymentStatus #

Bounded PaymentFailureReason 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

minBound :: PaymentFailureReason #

maxBound :: PaymentFailureReason #

Bounded UpdateFailure 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

minBound :: UpdateFailure #

maxBound :: UpdateFailure #

Bounded ChanStatusAction 
Instance details

Defined in Proto.Routerrpc.Router

Methods

minBound :: ChanStatusAction #

maxBound :: ChanStatusAction #

Bounded FailureDetail 
Instance details

Defined in Proto.Routerrpc.Router

Methods

minBound :: FailureDetail #

maxBound :: FailureDetail #

Bounded HtlcEvent'EventType 
Instance details

Defined in Proto.Routerrpc.Router

Methods

minBound :: HtlcEvent'EventType #

maxBound :: HtlcEvent'EventType #

Bounded PaymentState 
Instance details

Defined in Proto.Routerrpc.Router

Methods

minBound :: PaymentState #

maxBound :: PaymentState #

Bounded ResolveHoldForwardAction 
Instance details

Defined in Proto.Routerrpc.Router

Methods

minBound :: ResolveHoldForwardAction #

maxBound :: ResolveHoldForwardAction #

Bounded AddressType 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

minBound :: AddressType #

maxBound :: AddressType #

Bounded WitnessType 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

minBound :: WitnessType #

maxBound :: WitnessType #

Bounded PortNumber 
Instance details

Defined in Network.Socket.Types

Bounded IsolationLevel 
Instance details

Defined in Database.Persist.SqlBackend.Internal.IsolationLevel

Bounded Checkmark 
Instance details

Defined in Database.Persist.Types.Base

Bounded StreamingType 
Instance details

Defined in Data.ProtoLens.Service.Types

Methods

minBound :: StreamingType #

maxBound :: StreamingType #

Bounded ErrorLevel 
Instance details

Defined in Codec.QRCode.Data.ErrorLevel

Bounded ReleaseType 
Instance details

Defined in Data.Acquire.Internal

Bounded VarType 
Instance details

Defined in Text.Shakespeare

Bounded Leniency 
Instance details

Defined in Data.String.Conv

Bounded Undefined 
Instance details

Defined in Universum.Debug

Bounded Int128 
Instance details

Defined in Data.WideWord.Int128

Bounded Word128 
Instance details

Defined in Data.WideWord.Word128

Bounded Word256 
Instance details

Defined in Data.WideWord.Word256

Bounded Enctype 
Instance details

Defined in Yesod.Form.Types

Bounded CompressionStrategy 
Instance details

Defined in Codec.Compression.Zlib.Stream

Bounded Format 
Instance details

Defined in Codec.Compression.Zlib.Stream

Bounded Method 
Instance details

Defined in Codec.Compression.Zlib.Stream

Bounded Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Bounded ()

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

minBound :: () #

maxBound :: () #

Bounded Bool

Since: base-2.1

Instance details

Defined in GHC.Enum

Bounded Char

Since: base-2.1

Instance details

Defined in GHC.Enum

Bounded Int

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

minBound :: Int #

maxBound :: Int #

Bounded VecCount

Since: base-4.10.0.0

Instance details

Defined in GHC.Enum

Bounded VecElem

Since: base-4.10.0.0

Instance details

Defined in GHC.Enum

Bounded Word

Since: base-2.1

Instance details

Defined in GHC.Enum

Bounded a => Bounded (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Bounded a => Bounded (Down a)

Swaps minBound and maxBound of the underlying type.

Since: base-4.14.0.0

Instance details

Defined in Data.Ord

Methods

minBound :: Down a #

maxBound :: Down a #

Bounded a => Bounded (First a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

minBound :: First a #

maxBound :: First a #

Bounded a => Bounded (Last a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

minBound :: Last a #

maxBound :: Last a #

Bounded a => Bounded (Max a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

minBound :: Max a #

maxBound :: Max a #

Bounded a => Bounded (Min a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

minBound :: Min a #

maxBound :: Min a #

Bounded m => Bounded (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Bounded a => Bounded (Dual a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

minBound :: Dual a #

maxBound :: Dual a #

Bounded a => Bounded (Product a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Bounded a => Bounded (Sum a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

minBound :: Sum a #

maxBound :: Sum a #

SizeValid n => Bounded (Bits n) 
Instance details

Defined in Basement.Bits

Methods

minBound :: Bits n #

maxBound :: Bits n #

(BackendCompatible b s, Bounded (BackendKey b)) => Bounded (BackendKey (Compatible b s)) 
Instance details

Defined in Database.Persist.Compatible.Types

(PersistCore b, PersistCore (RawPostgresql b), Bounded (BackendKey b)) => Bounded (BackendKey (RawPostgresql b)) 
Instance details

Defined in Database.Persist.Postgresql

Bounded (Proxy t)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

minBound :: Proxy t #

maxBound :: Proxy t #

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

Defined in Data.Strict.Tuple

Methods

minBound :: Pair a b #

maxBound :: Pair a b #

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

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b) #

maxBound :: (a, b) #

Bounded a => Bounded (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

minBound :: Const a b #

maxBound :: Const a b #

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

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

minBound :: Ap f a #

maxBound :: Ap f a #

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

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Equality

Methods

minBound :: a :~: b #

maxBound :: a :~: b #

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

Defined in Data.Tagged

Methods

minBound :: Tagged s b #

maxBound :: Tagged s b #

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

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c) #

maxBound :: (a, b, c) #

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

Since: base-4.10.0.0

Instance details

Defined in Data.Type.Equality

Methods

minBound :: a :~~: b #

maxBound :: a :~~: b #

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

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

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

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

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

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

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

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

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

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

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

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

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

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

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

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

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

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

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

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

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

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

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

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

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

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

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

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

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

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

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

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

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

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

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

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

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

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

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

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

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

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

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

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

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

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

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

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

class Enum a where #

Class Enum defines operations on sequentially ordered types.

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

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

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

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

Minimal complete definition

toEnum, fromEnum

Methods

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

Instances details
Enum CBool 
Instance details

Defined in Foreign.C.Types

Enum CChar 
Instance details

Defined in Foreign.C.Types

Enum CClock 
Instance details

Defined in Foreign.C.Types

Enum CDouble 
Instance details

Defined in Foreign.C.Types

Enum CFloat 
Instance details

Defined in Foreign.C.Types

Enum CInt 
Instance details

Defined in Foreign.C.Types

Methods

succ :: CInt -> CInt #

pred :: CInt -> CInt #

toEnum :: Int -> CInt #

fromEnum :: CInt -> Int #

enumFrom :: CInt -> [CInt] #

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

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

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

Enum CIntMax 
Instance details

Defined in Foreign.C.Types

Enum CIntPtr 
Instance details

Defined in Foreign.C.Types

Enum CLLong 
Instance details

Defined in Foreign.C.Types

Enum CLong 
Instance details

Defined in Foreign.C.Types

Enum CPtrdiff 
Instance details

Defined in Foreign.C.Types

Enum CSChar 
Instance details

Defined in Foreign.C.Types

Enum CSUSeconds 
Instance details

Defined in Foreign.C.Types

Enum CShort 
Instance details

Defined in Foreign.C.Types

Enum CSigAtomic 
Instance details

Defined in Foreign.C.Types

Enum CSize 
Instance details

Defined in Foreign.C.Types

Enum CTime 
Instance details

Defined in Foreign.C.Types

Enum CUChar 
Instance details

Defined in Foreign.C.Types

Enum CUInt 
Instance details

Defined in Foreign.C.Types

Enum CUIntMax 
Instance details

Defined in Foreign.C.Types

Enum CUIntPtr 
Instance details

Defined in Foreign.C.Types

Enum CULLong 
Instance details

Defined in Foreign.C.Types

Enum CULong 
Instance details

Defined in Foreign.C.Types

Enum CUSeconds 
Instance details

Defined in Foreign.C.Types

Enum CUShort 
Instance details

Defined in Foreign.C.Types

Enum CWchar 
Instance details

Defined in Foreign.C.Types

Enum Associativity

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Enum DecidedStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Enum SourceStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Enum SourceUnpackedness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Enum SeekMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Device

Enum IOMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.IOMode

Enum Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Enum Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Enum Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Enum Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

succ :: Int8 -> Int8 #

pred :: Int8 -> Int8 #

toEnum :: Int -> Int8 #

fromEnum :: Int8 -> Int #

enumFrom :: Int8 -> [Int8] #

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

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

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

Enum DoCostCentres

Since: base-4.8.0.0

Instance details

Defined in GHC.RTS.Flags

Enum DoHeapProfile

Since: base-4.8.0.0

Instance details

Defined in GHC.RTS.Flags

Enum DoTrace

Since: base-4.8.0.0

Instance details

Defined in GHC.RTS.Flags

Enum GiveGCStats

Since: base-4.8.0.0

Instance details

Defined in GHC.RTS.Flags

Enum IoSubSystem

Since: base-4.9.0.0

Instance details

Defined in GHC.RTS.Flags

Enum 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 CBlkCnt 
Instance details

Defined in System.Posix.Types

Enum CBlkSize 
Instance details

Defined in System.Posix.Types

Enum CCc 
Instance details

Defined in System.Posix.Types

Methods

succ :: CCc -> CCc #

pred :: CCc -> CCc #

toEnum :: Int -> CCc #

fromEnum :: CCc -> Int #

enumFrom :: CCc -> [CCc] #

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

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

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

Enum CClockId 
Instance details

Defined in System.Posix.Types

Enum CDev 
Instance details

Defined in System.Posix.Types

Methods

succ :: CDev -> CDev #

pred :: CDev -> CDev #

toEnum :: Int -> CDev #

fromEnum :: CDev -> Int #

enumFrom :: CDev -> [CDev] #

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

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

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

Enum CFsBlkCnt 
Instance details

Defined in System.Posix.Types

Enum CFsFilCnt 
Instance details

Defined in System.Posix.Types

Enum CGid 
Instance details

Defined in System.Posix.Types

Methods

succ :: CGid -> CGid #

pred :: CGid -> CGid #

toEnum :: Int -> CGid #

fromEnum :: CGid -> Int #

enumFrom :: CGid -> [CGid] #

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

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

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

Enum CId 
Instance details

Defined in System.Posix.Types

Methods

succ :: CId -> CId #

pred :: CId -> CId #

toEnum :: Int -> CId #

fromEnum :: CId -> Int #

enumFrom :: CId -> [CId] #

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

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

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

Enum CIno 
Instance details

Defined in System.Posix.Types

Methods

succ :: CIno -> CIno #

pred :: CIno -> CIno #

toEnum :: Int -> CIno #

fromEnum :: CIno -> Int #

enumFrom :: CIno -> [CIno] #

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

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

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

Enum CKey 
Instance details

Defined in System.Posix.Types

Methods

succ :: CKey -> CKey #

pred :: CKey -> CKey #

toEnum :: Int -> CKey #

fromEnum :: CKey -> Int #

enumFrom :: CKey -> [CKey] #

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

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

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

Enum CMode 
Instance details

Defined in System.Posix.Types

Enum CNfds 
Instance details

Defined in System.Posix.Types

Enum CNlink 
Instance details

Defined in System.Posix.Types

Enum COff 
Instance details

Defined in System.Posix.Types

Methods

succ :: COff -> COff #

pred :: COff -> COff #

toEnum :: Int -> COff #

fromEnum :: COff -> Int #

enumFrom :: COff -> [COff] #

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

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

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

Enum CPid 
Instance details

Defined in System.Posix.Types

Methods

succ :: CPid -> CPid #

pred :: CPid -> CPid #

toEnum :: Int -> CPid #

fromEnum :: CPid -> Int #

enumFrom :: CPid -> [CPid] #

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

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

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

Enum CRLim 
Instance details

Defined in System.Posix.Types

Enum CSocklen 
Instance details

Defined in System.Posix.Types

Enum CSpeed 
Instance details

Defined in System.Posix.Types

Enum CSsize 
Instance details

Defined in System.Posix.Types

Enum CTcflag 
Instance details

Defined in System.Posix.Types

Enum CUid 
Instance details

Defined in System.Posix.Types

Methods

succ :: CUid -> CUid #

pred :: CUid -> CUid #

toEnum :: Int -> CUid #

fromEnum :: CUid -> Int #

enumFrom :: CUid -> [CUid] #

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

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

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

Enum Fd 
Instance details

Defined in System.Posix.Types

Methods

succ :: Fd -> Fd #

pred :: Fd -> Fd #

toEnum :: Int -> Fd #

fromEnum :: Fd -> Int #

enumFrom :: Fd -> [Fd] #

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

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

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

Enum Encoding 
Instance details

Defined in Basement.String

Enum UTF32_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF32

Methods

succ :: UTF32_Invalid -> UTF32_Invalid #

pred :: UTF32_Invalid -> UTF32_Invalid #

toEnum :: Int -> UTF32_Invalid #

fromEnum :: UTF32_Invalid -> Int #

enumFrom :: UTF32_Invalid -> [UTF32_Invalid] #

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

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

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

Enum Table Source # 
Instance details

Defined in BtcLsp.Data.Kind

Enum Privacy Source # 
Instance details

Defined in BtcLsp.Data.Type

Enum SwapStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Enum GCPort Source # 
Instance details

Defined in BtcLsp.Grpc.Client.LowLevel

Enum Encryption Source # 
Instance details

Defined in BtcLsp.Grpc.Data

Enum Code Source # 
Instance details

Defined in BtcLsp.Yesod.Data.Language

Methods

succ :: Code -> Code #

pred :: Code -> Code #

toEnum :: Int -> Code #

fromEnum :: Code -> Int #

enumFrom :: Code -> [Code] #

enumFromThen :: Code -> Code -> [Code] #

enumFromTo :: Code -> Code -> [Code] #

enumFromThenTo :: Code -> Code -> Code -> [Code] #

Enum Layout Source # 
Instance details

Defined in BtcLsp.Yesod.Data.Widget

Enum InputFailureKind Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Enum Privacy Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Enum Response'Failure'InputFailure Source # 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Enum Response'Failure'InputFailure Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Enum Response'Failure'InputFailure Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

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

Enum Month 
Instance details

Defined in Chronos

Enum Offset 
Instance details

Defined in Chronos

Enum OffsetFormat 
Instance details

Defined in Chronos

Enum OrdinalDate 
Instance details

Defined in Chronos

Enum Clock 
Instance details

Defined in System.Clock

Enum TimeSpec 
Instance details

Defined in System.Clock

Enum CryptoError 
Instance details

Defined in Crypto.Error.Types

Enum Extension 
Instance details

Defined in GHC.LanguageExtensions.Type

Enum Ordering

Since: base-2.1

Instance details

Defined in GHC.Enum

Enum StdMethod 
Instance details

Defined in Network.HTTP.Types.Method

Enum Status 
Instance details

Defined in Network.HTTP.Types.Status

Enum SettingsKeyId 
Instance details

Defined in Network.HTTP2.Frame.Types

Enum IP 
Instance details

Defined in Data.IP.Addr

Methods

succ :: IP -> IP #

pred :: IP -> IP #

toEnum :: Int -> IP #

fromEnum :: IP -> Int #

enumFrom :: IP -> [IP] #

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

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

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

Enum IPv4 
Instance details

Defined in Data.IP.Addr

Methods

succ :: IPv4 -> IPv4 #

pred :: IPv4 -> IPv4 #

toEnum :: Int -> IPv4 #

fromEnum :: IPv4 -> Int #

enumFrom :: IPv4 -> [IPv4] #

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

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

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

Enum IPv6 
Instance details

Defined in Data.IP.Addr

Methods

succ :: IPv6 -> IPv6 #

pred :: IPv6 -> IPv6 #

toEnum :: Int -> IPv6 #

fromEnum :: IPv6 -> Int #

enumFrom :: IPv6 -> [IPv6] #

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

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

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

Enum Severity 
Instance details

Defined in Katip.Core

Enum Verbosity 
Instance details

Defined in Katip.Core

Enum Seconds 
Instance details

Defined in LndClient.Data.Newtype

Methods

succ :: Seconds -> Seconds #

pred :: Seconds -> Seconds #

toEnum :: Int -> Seconds #

fromEnum :: Seconds -> Int #

enumFrom :: Seconds -> [Seconds] #

enumFromThen :: Seconds -> Seconds -> [Seconds] #

enumFromTo :: Seconds -> Seconds -> [Seconds] #

enumFromThenTo :: Seconds -> Seconds -> Seconds -> [Seconds] #

Enum LoggingMeta 
Instance details

Defined in LndClient.Data.Type

Methods

succ :: LoggingMeta -> LoggingMeta #

pred :: LoggingMeta -> LoggingMeta #

toEnum :: Int -> LoggingMeta #

fromEnum :: LoggingMeta -> Int #

enumFrom :: LoggingMeta -> [LoggingMeta] #

enumFromThen :: LoggingMeta -> LoggingMeta -> [LoggingMeta] #

enumFromTo :: LoggingMeta -> LoggingMeta -> [LoggingMeta] #

enumFromThenTo :: LoggingMeta -> LoggingMeta -> LoggingMeta -> [LoggingMeta] #

Enum LookupModifier 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

succ :: LookupModifier -> LookupModifier #

pred :: LookupModifier -> LookupModifier #

toEnum :: Int -> LookupModifier #

fromEnum :: LookupModifier -> Int #

enumFrom :: LookupModifier -> [LookupModifier] #

enumFromThen :: LookupModifier -> LookupModifier -> [LookupModifier] #

enumFromTo :: LookupModifier -> LookupModifier -> [LookupModifier] #

enumFromThenTo :: LookupModifier -> LookupModifier -> LookupModifier -> [LookupModifier] #

Enum AddressType 
Instance details

Defined in Proto.Lightning

Methods

succ :: AddressType -> AddressType #

pred :: AddressType -> AddressType #

toEnum :: Int -> AddressType #

fromEnum :: AddressType -> Int #

enumFrom :: AddressType -> [AddressType] #

enumFromThen :: AddressType -> AddressType -> [AddressType] #

enumFromTo :: AddressType -> AddressType -> [AddressType] #

enumFromThenTo :: AddressType -> AddressType -> AddressType -> [AddressType] #

Enum Peer'SyncType 
Instance details

Defined in Proto.Lightning

Methods

succ :: Peer'SyncType -> Peer'SyncType #

pred :: Peer'SyncType -> Peer'SyncType #

toEnum :: Int -> Peer'SyncType #

fromEnum :: Peer'SyncType -> Int #

enumFrom :: Peer'SyncType -> [Peer'SyncType] #

enumFromThen :: Peer'SyncType -> Peer'SyncType -> [Peer'SyncType] #

enumFromTo :: Peer'SyncType -> Peer'SyncType -> [Peer'SyncType] #

enumFromThenTo :: Peer'SyncType -> Peer'SyncType -> Peer'SyncType -> [Peer'SyncType] #

Enum PeerEvent'EventType 
Instance details

Defined in Proto.Lightning

Methods

succ :: PeerEvent'EventType -> PeerEvent'EventType #

pred :: PeerEvent'EventType -> PeerEvent'EventType #

toEnum :: Int -> PeerEvent'EventType #

fromEnum :: PeerEvent'EventType -> Int #

enumFrom :: PeerEvent'EventType -> [PeerEvent'EventType] #

enumFromThen :: PeerEvent'EventType -> PeerEvent'EventType -> [PeerEvent'EventType] #

enumFromTo :: PeerEvent'EventType -> PeerEvent'EventType -> [PeerEvent'EventType] #

enumFromThenTo :: PeerEvent'EventType -> PeerEvent'EventType -> PeerEvent'EventType -> [PeerEvent'EventType] #

Enum ChannelCloseSummary'ClosureType 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

succ :: ChannelCloseSummary'ClosureType -> ChannelCloseSummary'ClosureType #

pred :: ChannelCloseSummary'ClosureType -> ChannelCloseSummary'ClosureType #

toEnum :: Int -> ChannelCloseSummary'ClosureType #

fromEnum :: ChannelCloseSummary'ClosureType -> Int #

enumFrom :: ChannelCloseSummary'ClosureType -> [ChannelCloseSummary'ClosureType] #

enumFromThen :: ChannelCloseSummary'ClosureType -> ChannelCloseSummary'ClosureType -> [ChannelCloseSummary'ClosureType] #

enumFromTo :: ChannelCloseSummary'ClosureType -> ChannelCloseSummary'ClosureType -> [ChannelCloseSummary'ClosureType] #

enumFromThenTo :: ChannelCloseSummary'ClosureType -> ChannelCloseSummary'ClosureType -> ChannelCloseSummary'ClosureType -> [ChannelCloseSummary'ClosureType] #

Enum ChannelEventUpdate'UpdateType 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

succ :: ChannelEventUpdate'UpdateType -> ChannelEventUpdate'UpdateType #

pred :: ChannelEventUpdate'UpdateType -> ChannelEventUpdate'UpdateType #

toEnum :: Int -> ChannelEventUpdate'UpdateType #

fromEnum :: ChannelEventUpdate'UpdateType -> Int #

enumFrom :: ChannelEventUpdate'UpdateType -> [ChannelEventUpdate'UpdateType] #

enumFromThen :: ChannelEventUpdate'UpdateType -> ChannelEventUpdate'UpdateType -> [ChannelEventUpdate'UpdateType] #

enumFromTo :: ChannelEventUpdate'UpdateType -> ChannelEventUpdate'UpdateType -> [ChannelEventUpdate'UpdateType] #

enumFromThenTo :: ChannelEventUpdate'UpdateType -> ChannelEventUpdate'UpdateType -> ChannelEventUpdate'UpdateType -> [ChannelEventUpdate'UpdateType] #

Enum CommitmentType 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

succ :: CommitmentType -> CommitmentType #

pred :: CommitmentType -> CommitmentType #

toEnum :: Int -> CommitmentType #

fromEnum :: CommitmentType -> Int #

enumFrom :: CommitmentType -> [CommitmentType] #

enumFromThen :: CommitmentType -> CommitmentType -> [CommitmentType] #

enumFromTo :: CommitmentType -> CommitmentType -> [CommitmentType] #

enumFromThenTo :: CommitmentType -> CommitmentType -> CommitmentType -> [CommitmentType] #

Enum FeatureBit 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

succ :: FeatureBit -> FeatureBit #

pred :: FeatureBit -> FeatureBit #

toEnum :: Int -> FeatureBit #

fromEnum :: FeatureBit -> Int #

enumFrom :: FeatureBit -> [FeatureBit] #

enumFromThen :: FeatureBit -> FeatureBit -> [FeatureBit] #

enumFromTo :: FeatureBit -> FeatureBit -> [FeatureBit] #

enumFromThenTo :: FeatureBit -> FeatureBit -> FeatureBit -> [FeatureBit] #

Enum Initiator 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

succ :: Initiator -> Initiator #

pred :: Initiator -> Initiator #

toEnum :: Int -> Initiator #

fromEnum :: Initiator -> Int #

enumFrom :: Initiator -> [Initiator] #

enumFromThen :: Initiator -> Initiator -> [Initiator] #

enumFromTo :: Initiator -> Initiator -> [Initiator] #

enumFromThenTo :: Initiator -> Initiator -> Initiator -> [Initiator] #

Enum NodeMetricType 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

succ :: NodeMetricType -> NodeMetricType #

pred :: NodeMetricType -> NodeMetricType #

toEnum :: Int -> NodeMetricType #

fromEnum :: NodeMetricType -> Int #

enumFrom :: NodeMetricType -> [NodeMetricType] #

enumFromThen :: NodeMetricType -> NodeMetricType -> [NodeMetricType] #

enumFromTo :: NodeMetricType -> NodeMetricType -> [NodeMetricType] #

enumFromThenTo :: NodeMetricType -> NodeMetricType -> NodeMetricType -> [NodeMetricType] #

Enum PendingChannelsResponse'ForceClosedChannel'AnchorState 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

succ :: PendingChannelsResponse'ForceClosedChannel'AnchorState -> PendingChannelsResponse'ForceClosedChannel'AnchorState #

pred :: PendingChannelsResponse'ForceClosedChannel'AnchorState -> PendingChannelsResponse'ForceClosedChannel'AnchorState #

toEnum :: Int -> PendingChannelsResponse'ForceClosedChannel'AnchorState #

fromEnum :: PendingChannelsResponse'ForceClosedChannel'AnchorState -> Int #

enumFrom :: PendingChannelsResponse'ForceClosedChannel'AnchorState -> [PendingChannelsResponse'ForceClosedChannel'AnchorState] #

enumFromThen :: PendingChannelsResponse'ForceClosedChannel'AnchorState -> PendingChannelsResponse'ForceClosedChannel'AnchorState -> [PendingChannelsResponse'ForceClosedChannel'AnchorState] #

enumFromTo :: PendingChannelsResponse'ForceClosedChannel'AnchorState -> PendingChannelsResponse'ForceClosedChannel'AnchorState -> [PendingChannelsResponse'ForceClosedChannel'AnchorState] #

enumFromThenTo :: PendingChannelsResponse'ForceClosedChannel'AnchorState -> PendingChannelsResponse'ForceClosedChannel'AnchorState -> PendingChannelsResponse'ForceClosedChannel'AnchorState -> [PendingChannelsResponse'ForceClosedChannel'AnchorState] #

Enum ResolutionOutcome 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

succ :: ResolutionOutcome -> ResolutionOutcome #

pred :: ResolutionOutcome -> ResolutionOutcome #

toEnum :: Int -> ResolutionOutcome #

fromEnum :: ResolutionOutcome -> Int #

enumFrom :: ResolutionOutcome -> [ResolutionOutcome] #

enumFromThen :: ResolutionOutcome -> ResolutionOutcome -> [ResolutionOutcome] #

enumFromTo :: ResolutionOutcome -> ResolutionOutcome -> [ResolutionOutcome] #

enumFromThenTo :: ResolutionOutcome -> ResolutionOutcome -> ResolutionOutcome -> [ResolutionOutcome] #

Enum ResolutionType 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

succ :: ResolutionType -> ResolutionType #

pred :: ResolutionType -> ResolutionType #

toEnum :: Int -> ResolutionType #

fromEnum :: ResolutionType -> Int #

enumFrom :: ResolutionType -> [ResolutionType] #

enumFromThen :: ResolutionType -> ResolutionType -> [ResolutionType] #

enumFromTo :: ResolutionType -> ResolutionType -> [ResolutionType] #

enumFromThenTo :: ResolutionType -> ResolutionType -> ResolutionType -> [ResolutionType] #

Enum Failure'FailureCode 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

succ :: Failure'FailureCode -> Failure'FailureCode #

pred :: Failure'FailureCode -> Failure'FailureCode #

toEnum :: Int -> Failure'FailureCode #

fromEnum :: Failure'FailureCode -> Int #

enumFrom :: Failure'FailureCode -> [Failure'FailureCode] #

enumFromThen :: Failure'FailureCode -> Failure'FailureCode -> [Failure'FailureCode] #

enumFromTo :: Failure'FailureCode -> Failure'FailureCode -> [Failure'FailureCode] #

enumFromThenTo :: Failure'FailureCode -> Failure'FailureCode -> Failure'FailureCode -> [Failure'FailureCode] #

Enum HTLCAttempt'HTLCStatus 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

succ :: HTLCAttempt'HTLCStatus -> HTLCAttempt'HTLCStatus #

pred :: HTLCAttempt'HTLCStatus -> HTLCAttempt'HTLCStatus #

toEnum :: Int -> HTLCAttempt'HTLCStatus #

fromEnum :: HTLCAttempt'HTLCStatus -> Int #

enumFrom :: HTLCAttempt'HTLCStatus -> [HTLCAttempt'HTLCStatus] #

enumFromThen :: HTLCAttempt'HTLCStatus -> HTLCAttempt'HTLCStatus -> [HTLCAttempt'HTLCStatus] #

enumFromTo :: HTLCAttempt'HTLCStatus -> HTLCAttempt'HTLCStatus -> [HTLCAttempt'HTLCStatus] #

enumFromThenTo :: HTLCAttempt'HTLCStatus -> HTLCAttempt'HTLCStatus -> HTLCAttempt'HTLCStatus -> [HTLCAttempt'HTLCStatus] #

Enum Invoice'InvoiceState 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

succ :: Invoice'InvoiceState -> Invoice'InvoiceState #

pred :: Invoice'InvoiceState -> Invoice'InvoiceState #

toEnum :: Int -> Invoice'InvoiceState #

fromEnum :: Invoice'InvoiceState -> Int #

enumFrom :: Invoice'InvoiceState -> [Invoice'InvoiceState] #

enumFromThen :: Invoice'InvoiceState -> Invoice'InvoiceState -> [Invoice'InvoiceState] #

enumFromTo :: Invoice'InvoiceState -> Invoice'InvoiceState -> [Invoice'InvoiceState] #

enumFromThenTo :: Invoice'InvoiceState -> Invoice'InvoiceState -> Invoice'InvoiceState -> [Invoice'InvoiceState] #

Enum InvoiceHTLCState 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

succ :: InvoiceHTLCState -> InvoiceHTLCState #

pred :: InvoiceHTLCState -> InvoiceHTLCState #

toEnum :: Int -> InvoiceHTLCState #

fromEnum :: InvoiceHTLCState -> Int #

enumFrom :: InvoiceHTLCState -> [InvoiceHTLCState] #

enumFromThen :: InvoiceHTLCState -> InvoiceHTLCState -> [InvoiceHTLCState] #

enumFromTo :: InvoiceHTLCState -> InvoiceHTLCState -> [InvoiceHTLCState] #

enumFromThenTo :: InvoiceHTLCState -> InvoiceHTLCState -> InvoiceHTLCState -> [InvoiceHTLCState] #

Enum Payment'PaymentStatus 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

succ :: Payment'PaymentStatus -> Payment'PaymentStatus #

pred :: Payment'PaymentStatus -> Payment'PaymentStatus #

toEnum :: Int -> Payment'PaymentStatus #

fromEnum :: Payment'PaymentStatus -> Int #

enumFrom :: Payment'PaymentStatus -> [Payment'PaymentStatus] #

enumFromThen :: Payment'PaymentStatus -> Payment'PaymentStatus -> [Payment'PaymentStatus] #

enumFromTo :: Payment'PaymentStatus -> Payment'PaymentStatus -> [Payment'PaymentStatus] #

enumFromThenTo :: Payment'PaymentStatus -> Payment'PaymentStatus -> Payment'PaymentStatus -> [Payment'PaymentStatus] #

Enum PaymentFailureReason 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

succ :: PaymentFailureReason -> PaymentFailureReason #

pred :: PaymentFailureReason -> PaymentFailureReason #

toEnum :: Int -> PaymentFailureReason #

fromEnum :: PaymentFailureReason -> Int #

enumFrom :: PaymentFailureReason -> [PaymentFailureReason] #

enumFromThen :: PaymentFailureReason -> PaymentFailureReason -> [PaymentFailureReason] #

enumFromTo :: PaymentFailureReason -> PaymentFailureReason -> [PaymentFailureReason] #

enumFromThenTo :: PaymentFailureReason -> PaymentFailureReason -> PaymentFailureReason -> [PaymentFailureReason] #

Enum UpdateFailure 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

succ :: UpdateFailure -> UpdateFailure #

pred :: UpdateFailure -> UpdateFailure #

toEnum :: Int -> UpdateFailure #

fromEnum :: UpdateFailure -> Int #

enumFrom :: UpdateFailure -> [UpdateFailure] #

enumFromThen :: UpdateFailure -> UpdateFailure -> [UpdateFailure] #

enumFromTo :: UpdateFailure -> UpdateFailure -> [UpdateFailure] #

enumFromThenTo :: UpdateFailure -> UpdateFailure -> UpdateFailure -> [UpdateFailure] #

Enum ChanStatusAction 
Instance details

Defined in Proto.Routerrpc.Router

Methods

succ :: ChanStatusAction -> ChanStatusAction #

pred :: ChanStatusAction -> ChanStatusAction #

toEnum :: Int -> ChanStatusAction #

fromEnum :: ChanStatusAction -> Int #

enumFrom :: ChanStatusAction -> [ChanStatusAction] #

enumFromThen :: ChanStatusAction -> ChanStatusAction -> [ChanStatusAction] #

enumFromTo :: ChanStatusAction -> ChanStatusAction -> [ChanStatusAction] #

enumFromThenTo :: ChanStatusAction -> ChanStatusAction -> ChanStatusAction -> [ChanStatusAction] #

Enum FailureDetail 
Instance details

Defined in Proto.Routerrpc.Router

Methods

succ :: FailureDetail -> FailureDetail #

pred :: FailureDetail -> FailureDetail #

toEnum :: Int -> FailureDetail #

fromEnum :: FailureDetail -> Int #

enumFrom :: FailureDetail -> [FailureDetail] #

enumFromThen :: FailureDetail -> FailureDetail -> [FailureDetail] #

enumFromTo :: FailureDetail -> FailureDetail -> [FailureDetail] #

enumFromThenTo :: FailureDetail -> FailureDetail -> FailureDetail -> [FailureDetail] #

Enum HtlcEvent'EventType 
Instance details

Defined in Proto.Routerrpc.Router

Methods

succ :: HtlcEvent'EventType -> HtlcEvent'EventType #

pred :: HtlcEvent'EventType -> HtlcEvent'EventType #

toEnum :: Int -> HtlcEvent'EventType #

fromEnum :: HtlcEvent'EventType -> Int #

enumFrom :: HtlcEvent'EventType -> [HtlcEvent'EventType] #

enumFromThen :: HtlcEvent'EventType -> HtlcEvent'EventType -> [HtlcEvent'EventType] #

enumFromTo :: HtlcEvent'EventType -> HtlcEvent'EventType -> [HtlcEvent'EventType] #

enumFromThenTo :: HtlcEvent'EventType -> HtlcEvent'EventType -> HtlcEvent'EventType -> [HtlcEvent'EventType] #

Enum PaymentState 
Instance details

Defined in Proto.Routerrpc.Router

Methods

succ :: PaymentState -> PaymentState #

pred :: PaymentState -> PaymentState #

toEnum :: Int -> PaymentState #

fromEnum :: PaymentState -> Int #

enumFrom :: PaymentState -> [PaymentState] #

enumFromThen :: PaymentState -> PaymentState -> [PaymentState] #

enumFromTo :: PaymentState -> PaymentState -> [PaymentState] #

enumFromThenTo :: PaymentState -> PaymentState -> PaymentState -> [PaymentState] #

Enum ResolveHoldForwardAction 
Instance details

Defined in Proto.Routerrpc.Router

Methods

succ :: ResolveHoldForwardAction -> ResolveHoldForwardAction #

pred :: ResolveHoldForwardAction -> ResolveHoldForwardAction #

toEnum :: Int -> ResolveHoldForwardAction #

fromEnum :: ResolveHoldForwardAction -> Int #

enumFrom :: ResolveHoldForwardAction -> [ResolveHoldForwardAction] #

enumFromThen :: ResolveHoldForwardAction -> ResolveHoldForwardAction -> [ResolveHoldForwardAction] #

enumFromTo :: ResolveHoldForwardAction -> ResolveHoldForwardAction -> [ResolveHoldForwardAction] #

enumFromThenTo :: ResolveHoldForwardAction -> ResolveHoldForwardAction -> ResolveHoldForwardAction -> [ResolveHoldForwardAction] #

Enum AddressType 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

succ :: AddressType -> AddressType #

pred :: AddressType -> AddressType #

toEnum :: Int -> AddressType #

fromEnum :: AddressType -> Int #

enumFrom :: AddressType -> [AddressType] #

enumFromThen :: AddressType -> AddressType -> [AddressType] #

enumFromTo :: AddressType -> AddressType -> [AddressType] #

enumFromThenTo :: AddressType -> AddressType -> AddressType -> [AddressType] #

Enum WitnessType 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

succ :: WitnessType -> WitnessType #

pred :: WitnessType -> WitnessType #

toEnum :: Int -> WitnessType #

fromEnum :: WitnessType -> Int #

enumFrom :: WitnessType -> [WitnessType] #

enumFromThen :: WitnessType -> WitnessType -> [WitnessType] #

enumFromTo :: WitnessType -> WitnessType -> [WitnessType] #

enumFromThenTo :: WitnessType -> WitnessType -> WitnessType -> [WitnessType] #

Enum PortNumber 
Instance details

Defined in Network.Socket.Types

Enum IsolationLevel 
Instance details

Defined in Database.Persist.SqlBackend.Internal.IsolationLevel

Enum Checkmark 
Instance details

Defined in Database.Persist.Types.Base

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

Defined in Codec.QRCode.Data.ErrorLevel

Enum ReleaseType 
Instance details

Defined in Data.Acquire.Internal

Enum VarType 
Instance details

Defined in Text.Shakespeare

Enum Leniency 
Instance details

Defined in Data.String.Conv

Enum Day 
Instance details

Defined in Data.Time.Calendar.Days

Methods

succ :: Day -> Day #

pred :: Day -> Day #

toEnum :: Int -> Day #

fromEnum :: Day -> Int #

enumFrom :: Day -> [Day] #

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

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

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

Enum DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Enum NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Enum Undefined 
Instance details

Defined in Universum.Debug

Enum Int128 
Instance details

Defined in Data.WideWord.Int128

Enum Word128 
Instance details

Defined in Data.WideWord.Word128

Enum Word256 
Instance details

Defined in Data.WideWord.Word256

Enum Enctype 
Instance details

Defined in Yesod.Form.Types

Enum CompressionStrategy 
Instance details

Defined in Codec.Compression.Zlib.Stream

Enum Format 
Instance details

Defined in Codec.Compression.Zlib.Stream

Enum Method 
Instance details

Defined in Codec.Compression.Zlib.Stream

Enum Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Enum Integer

Since: base-2.1

Instance details

Defined in GHC.Enum

Enum Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Enum

Enum ()

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

succ :: () -> () #

pred :: () -> () #

toEnum :: Int -> () #

fromEnum :: () -> Int #

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

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

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

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

Enum Bool

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

succ :: Bool -> Bool #

pred :: Bool -> Bool #

toEnum :: Int -> Bool #

fromEnum :: Bool -> Int #

enumFrom :: Bool -> [Bool] #

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

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

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

Enum Char

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

succ :: Char -> Char #

pred :: Char -> Char #

toEnum :: Int -> Char #

fromEnum :: Char -> Int #

enumFrom :: Char -> [Char] #

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

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

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

Enum Int

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

succ :: Int -> Int #

pred :: Int -> Int #

toEnum :: Int -> Int #

fromEnum :: Int -> Int #

enumFrom :: Int -> [Int] #

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

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

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

Enum VecCount

Since: base-4.10.0.0

Instance details

Defined in GHC.Enum

Enum VecElem

Since: base-4.10.0.0

Instance details

Defined in GHC.Enum

Enum Word

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

succ :: Word -> Word #

pred :: Word -> Word #

toEnum :: Int -> Word #

fromEnum :: Word -> Int #

enumFrom :: Word -> [Word] #

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

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

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

Enum a => Enum (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Enum a => Enum (First a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

succ :: First a -> First a #

pred :: First a -> First a #

toEnum :: Int -> First a #

fromEnum :: First a -> Int #

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

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

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

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

Enum a => Enum (Last a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

succ :: Last a -> Last a #

pred :: Last a -> Last a #

toEnum :: Int -> Last a #

fromEnum :: Last a -> Int #

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

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

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

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

Enum a => Enum (Max a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

succ :: Max a -> Max a #

pred :: Max a -> Max a #

toEnum :: Int -> Max a #

fromEnum :: Max a -> Int #

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

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

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

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

Enum a => Enum (Min a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

succ :: Min a -> Min a #

pred :: Min a -> Min a #

toEnum :: Int -> Min a #

fromEnum :: Min a -> Int #

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

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

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

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

Enum a => Enum (WrappedMonoid a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Integral a => Enum (Ratio a)

Since: base-2.0.1

Instance details

Defined in GHC.Real

Methods

succ :: Ratio a -> Ratio a #

pred :: Ratio a -> Ratio a #

toEnum :: Int -> Ratio a #

fromEnum :: Ratio a -> Int #

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

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

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

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

SizeValid n => Enum (Bits n) 
Instance details

Defined in Basement.Bits

Methods

succ :: Bits n -> Bits n #

pred :: Bits n -> Bits n #

toEnum :: Int -> Bits n #

fromEnum :: Bits n -> Int #

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

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

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

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

Enum (CountOf ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

succ :: CountOf ty -> CountOf ty #

pred :: CountOf ty -> CountOf ty #

toEnum :: Int -> CountOf ty #

fromEnum :: CountOf ty -> Int #

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

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

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

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

Enum (Offset ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

succ :: Offset ty -> Offset ty #

pred :: Offset ty -> Offset ty #

toEnum :: Int -> Offset ty #

fromEnum :: Offset ty -> Int #

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

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

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

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

(BackendCompatible b s, Enum (BackendKey b)) => Enum (BackendKey (Compatible b s)) 
Instance details

Defined in Database.Persist.Compatible.Types

(PersistCore b, PersistCore (RawPostgresql b), Enum (BackendKey b)) => Enum (BackendKey (RawPostgresql b)) 
Instance details

Defined in Database.Persist.Postgresql

Enum (Fixed a)

Recall that, for numeric types, succ and pred typically add and subtract 1, respectively. This is not true in the case of Fixed, whose successor and predecessor functions intuitively return the "next" and "previous" values in the enumeration. The results of these functions thus depend on the resolution of the Fixed value. For example, when enumerating values of resolution 10^-3 of type Milli = Fixed E3,

  succ (0.000 :: Milli) == 1.001

and likewise

  pred (0.000 :: Milli) == -0.001

In other words, succ and pred increment and decrement a fixed-precision value by the least amount such that the value's resolution is unchanged. For example, 10^-12 is the smallest (positive) amount that can be added to a value of type Pico = Fixed E12 without changing its resolution, and so

  succ (0.000000000000 :: Pico) == 0.000000000001

and similarly

  pred (0.000000000000 :: Pico) == -0.000000000001

This is worth bearing in mind when defining Fixed arithmetic sequences. In particular, you may be forgiven for thinking the sequence

  [1..10] :: [Pico]

evaluates to [1, 2, 3, 4, 5, 6, 7, 8, 9, 10] :: [Pico].

However, this is not true. On the contrary, similarly to the above implementations of succ and pred, enumFromTo :: Pico -> Pico -> [Pico] has a "step size" of 10^-12. Hence, the list [1..10] :: [Pico] has the form

  [1.000000000000, 1.00000000001, 1.00000000002, ..., 10.000000000000]

and contains 9 * 10^12 + 1 values.

Since: base-2.1

Instance details

Defined in Data.Fixed

Methods

succ :: Fixed a -> Fixed a #

pred :: Fixed a -> Fixed a #

toEnum :: Int -> Fixed a #

fromEnum :: Fixed a -> Int #

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

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

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

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

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

Instances details
Eq DynamicImage 
Instance details

Defined in Codec.Picture.Types

Eq PixelCMYK16 
Instance details

Defined in Codec.Picture.Types

Eq PixelCMYK8 
Instance details

Defined in Codec.Picture.Types

Eq PixelRGB16 
Instance details

Defined in Codec.Picture.Types

Eq PixelRGB8 
Instance details

Defined in Codec.Picture.Types

Eq PixelRGBA16 
Instance details

Defined in Codec.Picture.Types

Eq PixelRGBA8 
Instance details

Defined in Codec.Picture.Types

Eq PixelRGBF 
Instance details

Defined in Codec.Picture.Types

Eq PixelYA16 
Instance details

Defined in Codec.Picture.Types

Eq PixelYA8 
Instance details

Defined in Codec.Picture.Types

Eq PixelYCbCr8 
Instance details

Defined in Codec.Picture.Types

Eq PixelYCbCrK8 
Instance details

Defined in Codec.Picture.Types

Eq DotNetTime 
Instance details

Defined in Data.Aeson.Types.Internal

Eq JSONPathElement 
Instance details

Defined in Data.Aeson.Types.Internal

Eq SumEncoding 
Instance details

Defined in Data.Aeson.Types.Internal

Eq Value 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

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

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

Eq AsyncCancelled 
Instance details

Defined in Control.Concurrent.Async

Eq More 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

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

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

Eq Pos 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

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

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

Eq All

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

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

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

Eq Any

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

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

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

Eq SomeTypeRep 
Instance details

Defined in Data.Typeable.Internal

Eq Version

Since: base-2.1

Instance details

Defined in Data.Version

Methods

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

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

Eq Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Methods

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

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

Eq CBool 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Eq CChar 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Eq CClock 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Eq CDouble 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Eq CFloat 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Eq CInt 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Eq CIntMax 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Eq CIntPtr 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Eq CLLong 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Eq CLong 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Eq CPtrdiff 
Instance details

Defined in Foreign.C.Types

Eq CSChar 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Eq CSUSeconds 
Instance details

Defined in Foreign.C.Types

Eq CShort 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Eq CSigAtomic 
Instance details

Defined in Foreign.C.Types

Eq CSize 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Eq CTime 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Eq CUChar 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Eq CUInt 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Eq CUIntMax 
Instance details

Defined in Foreign.C.Types

Eq CUIntPtr 
Instance details

Defined in Foreign.C.Types

Eq CULLong 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Eq CULong 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Eq CUSeconds 
Instance details

Defined in Foreign.C.Types

Eq CUShort 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Eq CWchar 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Eq BlockReason

Since: base-4.3.0.0

Instance details

Defined in GHC.Conc.Sync

Eq ThreadId

Since: base-4.2.0.0

Instance details

Defined in GHC.Conc.Sync

Eq ThreadStatus

Since: base-4.3.0.0

Instance details

Defined in GHC.Conc.Sync

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

Since: base-4.3.0.0

Instance details

Defined in GHC.Exts

Eq Associativity

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Eq DecidedStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Eq Fixity

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Methods

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

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

Eq SourceStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Eq SourceUnpackedness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Eq MaskingState

Since: base-4.3.0.0

Instance details

Defined in GHC.IO

Eq IODeviceType

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Device

Eq SeekMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Device

Eq ArrayException

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Exception

Eq AsyncException

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Exception

Eq ExitCode 
Instance details

Defined in GHC.IO.Exception

Eq IOErrorType

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Eq IOException

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Eq BufferMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Handle.Types

Eq Handle

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Handle.Types

Methods

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

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

Eq Newline

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Handle.Types

Methods

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

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

Eq NewlineMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Handle.Types

Eq IOMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.IOMode

Methods

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

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

Eq Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

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

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

Eq Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

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

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

Eq Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

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

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

Eq Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

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

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

Eq IoSubSystem 
Instance details

Defined in GHC.RTS.Flags

Eq SrcLoc

Since: base-4.9.0.0

Instance details

Defined in GHC.Stack.Types

Methods

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

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

Eq 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 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 CBlkCnt 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CBlkSize 
Instance details

Defined in System.Posix.Types

Eq CCc 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CClockId 
Instance details

Defined in System.Posix.Types

Eq CDev 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CFsBlkCnt 
Instance details

Defined in System.Posix.Types

Eq CFsFilCnt 
Instance details

Defined in System.Posix.Types

Eq CGid 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CId 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CIno 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CKey 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CMode 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CNfds 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CNlink 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq COff 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CPid 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CRLim 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CSocklen 
Instance details

Defined in System.Posix.Types

Eq CSpeed 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CSsize 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CTcflag 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CTimer 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq CUid 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq Fd 
Instance details

Defined in System.Posix.Types

Methods

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

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

Eq 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 Encoding 
Instance details

Defined in Basement.String

Eq ASCII7_Invalid 
Instance details

Defined in Basement.String.Encoding.ASCII7

Methods

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

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

Eq ISO_8859_1_Invalid 
Instance details

Defined in Basement.String.Encoding.ISO_8859_1

Methods

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

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

Eq UTF16_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF16

Methods

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

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

Eq UTF32_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF32

Methods

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

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

Eq FileSize 
Instance details

Defined in Basement.Types.OffsetSize

Eq String 
Instance details

Defined in Basement.UTF8.Base

Methods

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

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

Eq BitcoinLayer Source # 
Instance details

Defined in BtcLsp.Data.Kind

Eq Direction Source # 
Instance details

Defined in BtcLsp.Data.Kind

Eq MoneyRelation Source # 
Instance details

Defined in BtcLsp.Data.Kind

Eq Owner Source # 
Instance details

Defined in BtcLsp.Data.Kind

Methods

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

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

Eq Table Source # 
Instance details

Defined in BtcLsp.Data.Kind

Methods

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

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

Eq BlkHash Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

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

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

Eq BlkHeight Source # 
Instance details

Defined in BtcLsp.Data.Type

Eq BlkStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Eq Failure Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

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

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

Eq FailureInput Source # 
Instance details

Defined in BtcLsp.Data.Type

Eq FailureInternal Source # 
Instance details

Defined in BtcLsp.Data.Type

Eq FeeRate Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

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

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

Eq LnChanStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Eq LnInvoiceStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Eq MicroSeconds Source # 
Instance details

Defined in BtcLsp.Data.Type

Eq NodePubKeyHex Source # 
Instance details

Defined in BtcLsp.Data.Type

Eq NodeUri Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

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

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

Eq NodeUriHex Source # 
Instance details

Defined in BtcLsp.Data.Type

Eq Nonce Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

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

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

Eq Privacy Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

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

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

Eq RHashHex Source # 
Instance details

Defined in BtcLsp.Data.Type

Eq RowQty Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

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

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

Eq Seconds Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

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

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

Eq SocketAddress Source # 
Instance details

Defined in BtcLsp.Data.Type

Eq SwapHash Source # 
Instance details

Defined in BtcLsp.Data.Type

Eq SwapStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Eq SwapUtxoStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Eq UtxoLockId Source # 
Instance details

Defined in BtcLsp.Data.Type

Eq Vbyte Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

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

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

Eq YesodLog Source # 
Instance details

Defined in BtcLsp.Data.Type

Eq GCPort Source # 
Instance details

Defined in BtcLsp.Grpc.Client.LowLevel

Methods

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

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

Eq Encryption Source # 
Instance details

Defined in BtcLsp.Grpc.Data

Eq RawRequestBytes Source # 
Instance details

Defined in BtcLsp.Grpc.Data

Eq SigHeaderName Source # 
Instance details

Defined in BtcLsp.Grpc.Data

Eq LndSig Source # 
Instance details

Defined in BtcLsp.Grpc.Sig

Methods

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

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

Eq MsgToSign Source # 
Instance details

Defined in BtcLsp.Grpc.Sig

Eq InQty Source # 
Instance details

Defined in BtcLsp.Math.OnChain

Methods

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

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

Eq OutQty Source # 
Instance details

Defined in BtcLsp.Math.OnChain

Methods

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

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

Eq SatPerVbyte Source # 
Instance details

Defined in BtcLsp.Math.OnChain

Eq SwapCap Source # 
Instance details

Defined in BtcLsp.Math.Swap

Methods

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

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

Eq Block Source # 
Instance details

Defined in BtcLsp.Storage.Model

Methods

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

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

Eq LnChan Source # 
Instance details

Defined in BtcLsp.Storage.Model

Methods

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

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

Eq SwapIntoLn Source # 
Instance details

Defined in BtcLsp.Storage.Model

Eq SwapUtxo Source # 
Instance details

Defined in BtcLsp.Storage.Model

Eq User Source # 
Instance details

Defined in BtcLsp.Storage.Model

Methods

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

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

Eq SwapInfo Source # 
Instance details

Defined in BtcLsp.Storage.Model.SwapIntoLn

Eq UtxoInfo Source # 
Instance details

Defined in BtcLsp.Storage.Model.SwapIntoLn

Eq BootstrapColor Source # 
Instance details

Defined in BtcLsp.Yesod.Data.BootstrapColor

Eq Code Source # 
Instance details

Defined in BtcLsp.Yesod.Data.Language

Methods

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

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

Eq HtmlClassAttr Source # 
Instance details

Defined in BtcLsp.Yesod.Data.Widget

Eq Layout Source # 
Instance details

Defined in BtcLsp.Yesod.Data.Widget

Methods

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

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

Eq Ctx Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

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

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

Eq FeeMoney Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Eq FeeRate Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

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

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

Eq FieldIndex Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Eq FundLnHodlInvoice Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Eq FundLnInvoice Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Eq FundMoney Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Eq FundOnChainAddress Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Eq InputFailure Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Eq InputFailureKind Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Eq InputFailureKind'UnrecognizedValue Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Eq InternalFailure Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Eq InternalFailure'Either Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Eq LnHost Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

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

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

Eq LnPeer Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

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

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

Eq LnPort Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

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

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

Eq LnPubKey Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Eq LocalBalance Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Eq Nonce Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

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

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

Eq Privacy Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

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

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

Eq Privacy'UnrecognizedValue Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Eq RefundMoney Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Eq RefundOnChainAddress Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Eq RemoteBalance Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Eq LnHodlInvoice Source # 
Instance details

Defined in Proto.BtcLsp.Data.LowLevel

Eq LnInvoice Source # 
Instance details

Defined in Proto.BtcLsp.Data.LowLevel

Eq Msat Source # 
Instance details

Defined in Proto.BtcLsp.Data.LowLevel

Methods

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

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

Eq OnChainAddress Source # 
Instance details

Defined in Proto.BtcLsp.Data.LowLevel

Eq Urational Source # 
Instance details

Defined in Proto.BtcLsp.Data.LowLevel

Eq Request Source # 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Methods

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

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

Eq Response Source # 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Eq Response'Either Source # 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Eq Response'Failure Source # 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Eq Response'Failure'InputFailure Source # 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Eq Response'Failure'InputFailure'UnrecognizedValue Source # 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Eq Response'Success Source # 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Eq Request Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Methods

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

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

Eq Response Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Eq Response'Either Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Eq Response'Failure Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Eq Response'Failure'InputFailure Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Eq Response'Failure'InputFailure'UnrecognizedValue Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Eq Response'Success Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Eq Request Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Methods

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

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

Eq Response Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Eq Response'Either Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Eq Response'Failure Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Eq Response'Failure'InputFailure Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Eq Response'Failure'InputFailure'UnrecognizedValue Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Eq Response'Success Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Eq Bytes 
Instance details

Defined in Data.Bytes.Internal

Methods

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

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

Eq ByteString 
Instance details

Defined in Data.ByteString.Internal

Eq ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Eq ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Eq Date 
Instance details

Defined in Chronos

Methods

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

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

Eq Datetime 
Instance details

Defined in Chronos

Eq DatetimeFormat 
Instance details

Defined in Chronos

Eq Day 
Instance details

Defined in Chronos

Methods

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

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

Eq DayOfMonth 
Instance details

Defined in Chronos

Eq DayOfWeek 
Instance details

Defined in Chronos

Eq DayOfYear 
Instance details

Defined in Chronos

Eq Month 
Instance details

Defined in Chronos

Methods

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

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

Eq MonthDate 
Instance details

Defined in Chronos

Eq Offset 
Instance details

Defined in Chronos

Methods

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

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

Eq OffsetDatetime 
Instance details

Defined in Chronos

Eq OffsetFormat 
Instance details

Defined in Chronos

Eq OrdinalDate 
Instance details

Defined in Chronos

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

Eq TimeOfDay 
Instance details

Defined in Chronos

Eq TimeParts 
Instance details

Defined in Chronos

Eq Timespan 
Instance details

Defined in Chronos

Eq Year 
Instance details

Defined in Chronos

Methods

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

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

Eq IV 
Instance details

Defined in Web.ClientSession

Methods

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

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

Eq Key 
Instance details

Defined in Web.ClientSession

Methods

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

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

Eq Clock 
Instance details

Defined in System.Clock

Methods

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

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

Eq TimeSpec 
Instance details

Defined in System.Clock

Eq IntSet 
Instance details

Defined in Data.IntSet.Internal

Methods

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

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

Eq Relation 
Instance details

Defined in Data.IntSet.Internal

Methods

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

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

Eq SameSiteOption 
Instance details

Defined in Web.Cookie

Eq SetCookie 
Instance details

Defined in Web.Cookie

Eq SharedSecret 
Instance details

Defined in Crypto.ECC

Eq CryptoError 
Instance details

Defined in Crypto.Error.Types

Eq EmailAddress 
Instance details

Defined in Text.Email.Parser

Eq Error 
Instance details

Defined in Env.Internal.Error

Methods

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

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

Eq CommonTableExpressionKind 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Eq Ident 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Methods

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

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

Eq JoinKind 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Eq LimitClause 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Eq NeedParens 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Eq OnClauseWithoutMatchingJoinException 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Eq LogStr 
Instance details

Defined in System.Log.FastLogger.LogStr

Methods

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

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

Eq SecretVision 
Instance details

Defined in Text.PrettyPrint.GenericPretty.Type

Eq BigNat 
Instance details

Defined in GHC.Num.BigNat

Methods

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

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

Eq ForeignSrcLang 
Instance details

Defined in GHC.ForeignSrcLang.Type

Eq Extension 
Instance details

Defined in GHC.LanguageExtensions.Type

Eq Module 
Instance details

Defined in GHC.Classes

Methods

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

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

Eq Ordering 
Instance details

Defined in GHC.Classes

Eq TrName 
Instance details

Defined in GHC.Classes

Methods

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

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

Eq TyCon 
Instance details

Defined in GHC.Classes

Methods

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

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

Eq ConnHost 
Instance details

Defined in Network.HTTP.Client.Types

Eq ConnKey 
Instance details

Defined in Network.HTTP.Client.Types

Methods

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

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

Eq Proxy 
Instance details

Defined in Network.HTTP.Client.Types

Methods

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

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

Eq ProxySecureMode 
Instance details

Defined in Network.HTTP.Client.Types

Eq ResponseTimeout 
Instance details

Defined in Network.HTTP.Client.Types

Eq StatusHeaders 
Instance details

Defined in Network.HTTP.Client.Types

Eq StreamFileStatus 
Instance details

Defined in Network.HTTP.Client.Types

Eq DigestAuthExceptionDetails 
Instance details

Defined in Network.HTTP.Client.TLS

Eq ByteRange 
Instance details

Defined in Network.HTTP.Types.Header

Eq StdMethod 
Instance details

Defined in Network.HTTP.Types.Method

Eq Status 
Instance details

Defined in Network.HTTP.Types.Status

Methods

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

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

Eq EscapeItem 
Instance details

Defined in Network.HTTP.Types.URI

Eq HttpVersion 
Instance details

Defined in Network.HTTP.Types.Version

Eq CompressionAlgo 
Instance details

Defined in Network.HPACK.Types

Eq DecodeError 
Instance details

Defined in Network.HPACK.Types

Eq EncodeStrategy 
Instance details

Defined in Network.HPACK.Types

Eq HIndex 
Instance details

Defined in Network.HPACK.Types

Methods

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

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

Eq FileSpec 
Instance details

Defined in Network.HTTP2.Arch.Types

Eq ErrorCodeId 
Instance details

Defined in Network.HTTP2.Frame.Types

Eq Frame 
Instance details

Defined in Network.HTTP2.Frame.Types

Methods

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

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

Eq FrameHeader 
Instance details

Defined in Network.HTTP2.Frame.Types

Eq FramePayload 
Instance details

Defined in Network.HTTP2.Frame.Types

Eq FrameTypeId 
Instance details

Defined in Network.HTTP2.Frame.Types

Eq HTTP2Error 
Instance details

Defined in Network.HTTP2.Frame.Types

Eq Priority 
Instance details

Defined in Network.HTTP2.Frame.Types

Eq SettingsKeyId 
Instance details

Defined in Network.HTTP2.Frame.Types

Eq ClientError 
Instance details

Defined in Network.HTTP2.Client2.Exceptions

Methods

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

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

Eq CompressMode Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

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 IP

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

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

Defined in Data.IP.Addr

Methods

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

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

Eq IPv4 
Instance details

Defined in Data.IP.Addr

Methods

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

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

Eq IPv6 
Instance details

Defined in Data.IP.Addr

Methods

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

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

Eq IPRange 
Instance details

Defined in Data.IP.Range

Methods

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

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

Eq Environment 
Instance details

Defined in Katip.Core

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

Eq ScribeSettings 
Instance details

Defined in Katip.Core

Eq Severity 
Instance details

Defined in Katip.Core

Eq ThreadIdText 
Instance details

Defined in Katip.Core

Eq Verbosity 
Instance details

Defined in Katip.Core

Eq ColorStrategy 
Instance details

Defined in Katip.Scribes.Handle

Eq AddHodlInvoiceRequest 
Instance details

Defined in LndClient.Data.AddHodlInvoice

Methods

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

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

Eq AddInvoiceRequest 
Instance details

Defined in LndClient.Data.AddInvoice

Methods

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

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

Eq AddInvoiceResponse 
Instance details

Defined in LndClient.Data.AddInvoice

Methods

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

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

Eq Channel 
Instance details

Defined in LndClient.Data.Channel

Methods

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

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

Eq ChannelBackup 
Instance details

Defined in LndClient.Data.ChannelBackup

Methods

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

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

Eq SingleChanBackupBlob 
Instance details

Defined in LndClient.Data.ChannelBackup

Methods

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

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

Eq ChannelPoint 
Instance details

Defined in LndClient.Data.ChannelPoint

Methods

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

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

Eq ChannelCloseSummary 
Instance details

Defined in LndClient.Data.CloseChannel

Methods

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

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

Eq ChannelCloseUpdate 
Instance details

Defined in LndClient.Data.CloseChannel

Methods

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

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

Eq CloseChannelRequest 
Instance details

Defined in LndClient.Data.CloseChannel

Methods

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

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

Eq CloseStatusUpdate 
Instance details

Defined in LndClient.Data.CloseChannel

Methods

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

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

Eq ClosedChannel 
Instance details

Defined in LndClient.Data.ClosedChannel

Methods

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

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

Eq ClosedChannelsRequest 
Instance details

Defined in LndClient.Data.ClosedChannels

Methods

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

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

Eq FinalizePsbtRequest 
Instance details

Defined in LndClient.Data.FinalizePsbt

Methods

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

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

Eq FinalizePsbtResponse 
Instance details

Defined in LndClient.Data.FinalizePsbt

Methods

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

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

Eq ForceClosedChannel 
Instance details

Defined in LndClient.Data.ForceClosedChannel

Methods

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

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

Eq Fee 
Instance details

Defined in LndClient.Data.FundPsbt

Methods

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

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

Eq FundPsbtRequest 
Instance details

Defined in LndClient.Data.FundPsbt

Methods

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

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

Eq FundPsbtResponse 
Instance details

Defined in LndClient.Data.FundPsbt

Methods

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

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

Eq TxTemplate 
Instance details

Defined in LndClient.Data.FundPsbt

Methods

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

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

Eq UtxoLease 
Instance details

Defined in LndClient.Data.FundPsbt

Methods

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

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

Eq FundingPsbtFinalize 
Instance details

Defined in LndClient.Data.FundingPsbtFinalize

Methods

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

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

Eq FundingPsbtVerify 
Instance details

Defined in LndClient.Data.FundingPsbtVerify

Methods

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

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

Eq ChanPointShim 
Instance details

Defined in LndClient.Data.FundingShim

Methods

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

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

Eq FundingShim 
Instance details

Defined in LndClient.Data.FundingShim

Methods

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

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

Eq KeyDescriptor 
Instance details

Defined in LndClient.Data.FundingShim

Methods

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

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

Eq FundingShimCancel 
Instance details

Defined in LndClient.Data.FundingShimCancel

Methods

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

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

Eq FundingStateStepRequest 
Instance details

Defined in LndClient.Data.FundingStateStep

Methods

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

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

Eq GetInfoResponse 
Instance details

Defined in LndClient.Data.GetInfo

Methods

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

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

Eq EventType 
Instance details

Defined in LndClient.Data.HtlcEvent

Methods

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

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

Eq HtlcEvent 
Instance details

Defined in LndClient.Data.HtlcEvent

Methods

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

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

Eq Invoice 
Instance details

Defined in LndClient.Data.Invoice

Methods

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

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

Eq InvoiceState 
Instance details

Defined in LndClient.Data.Invoice

Methods

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

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

Eq TxKind 
Instance details

Defined in LndClient.Data.Kind

Methods

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

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

Eq LeaseOutputRequest 
Instance details

Defined in LndClient.Data.LeaseOutput

Methods

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

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

Eq LeaseOutputResponse 
Instance details

Defined in LndClient.Data.LeaseOutput

Methods

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

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

Eq ListLeasesRequest 
Instance details

Defined in LndClient.Data.ListLeases

Methods

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

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

Eq ListLeasesResponse 
Instance details

Defined in LndClient.Data.ListLeases

Methods

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

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

Eq UtxoLease 
Instance details

Defined in LndClient.Data.ListLeases

Methods

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

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

Eq ListUnspentRequest 
Instance details

Defined in LndClient.Data.ListUnspent

Methods

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

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

Eq ListUnspentResponse 
Instance details

Defined in LndClient.Data.ListUnspent

Methods

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

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

Eq Utxo 
Instance details

Defined in LndClient.Data.ListUnspent

Methods

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

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

Eq LndHexMacaroon 
Instance details

Defined in LndClient.Data.LndEnv

Methods

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

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

Eq LndHost' 
Instance details

Defined in LndClient.Data.LndEnv

Methods

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

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

Eq LndPort' 
Instance details

Defined in LndClient.Data.LndEnv

Methods

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

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

Eq LndTlsCert 
Instance details

Defined in LndClient.Data.LndEnv

Methods

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

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

Eq LndWalletPassword 
Instance details

Defined in LndClient.Data.LndEnv

Methods

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

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

Eq RawConfig 
Instance details

Defined in LndClient.Data.LndEnv

Methods

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

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

Eq AddressType 
Instance details

Defined in LndClient.Data.NewAddress

Methods

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

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

Eq NewAddressRequest 
Instance details

Defined in LndClient.Data.NewAddress

Methods

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

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

Eq NewAddressResponse 
Instance details

Defined in LndClient.Data.NewAddress

Methods

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

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

Eq AddIndex 
Instance details

Defined in LndClient.Data.Newtype

Methods

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

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

Eq AezeedPassphrase 
Instance details

Defined in LndClient.Data.Newtype

Methods

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

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

Eq ChanId 
Instance details

Defined in LndClient.Data.Newtype

Methods

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

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

Eq CipherSeedMnemonic 
Instance details

Defined in LndClient.Data.Newtype

Methods

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

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

Eq GrpcTimeoutSeconds 
Instance details

Defined in LndClient.Data.Newtype

Methods

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

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

Eq MSat 
Instance details

Defined in LndClient.Data.Newtype

Methods

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

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

Eq NodeLocation 
Instance details

Defined in LndClient.Data.Newtype

Methods

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

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

Eq NodePubKey 
Instance details

Defined in LndClient.Data.Newtype

Eq PaymentRequest 
Instance details

Defined in LndClient.Data.Newtype

Methods

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

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

Eq PendingChannelId 
Instance details

Defined in LndClient.Data.Newtype

Methods

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

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

Eq Psbt 
Instance details

Defined in LndClient.Data.Newtype

Methods

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

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

Eq RHash 
Instance details

Defined in LndClient.Data.Newtype

Methods

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

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

Eq RPreimage 
Instance details

Defined in LndClient.Data.Newtype

Eq RawTx 
Instance details

Defined in LndClient.Data.Newtype

Methods

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

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

Eq Seconds 
Instance details

Defined in LndClient.Data.Newtype

Methods

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

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

Eq SettleIndex 
Instance details

Defined in LndClient.Data.Newtype

Methods

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

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

Eq ChannelOpenUpdate 
Instance details

Defined in LndClient.Data.OpenChannel

Methods

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

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

Eq OpenChannelRequest 
Instance details

Defined in LndClient.Data.OpenChannel

Methods

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

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

Eq OpenStatusUpdate 
Instance details

Defined in LndClient.Data.OpenChannel

Methods

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

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

Eq OpenStatusUpdate' 
Instance details

Defined in LndClient.Data.OpenChannel

Methods

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

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

Eq ReadyForPsbtFunding 
Instance details

Defined in LndClient.Data.OpenChannel

Methods

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

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

Eq OutPoint 
Instance details

Defined in LndClient.Data.OutPoint

Methods

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

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

Eq PayReq 
Instance details

Defined in LndClient.Data.PayReq

Methods

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

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

Eq Payment 
Instance details

Defined in LndClient.Data.Payment

Methods

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

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

Eq PaymentStatus 
Instance details

Defined in LndClient.Data.Payment

Methods

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

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

Eq ConnectPeerRequest 
Instance details

Defined in LndClient.Data.Peer

Methods

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

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

Eq LightningAddress 
Instance details

Defined in LndClient.Data.Peer

Methods

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

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

Eq Peer 
Instance details

Defined in LndClient.Data.Peer

Methods

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

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

Eq PendingChannel 
Instance details

Defined in LndClient.Data.PendingChannel

Methods

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

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

Eq PendingChannelsResponse 
Instance details

Defined in LndClient.Data.PendingChannels

Methods

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

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

Eq PendingOpenChannel 
Instance details

Defined in LndClient.Data.PendingOpenChannel

Methods

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

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

Eq PsbtShim 
Instance details

Defined in LndClient.Data.PsbtShim

Methods

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

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

Eq PublishTransactionRequest 
Instance details

Defined in LndClient.Data.PublishTransaction

Methods

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

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

Eq PublishTransactionResponse 
Instance details

Defined in LndClient.Data.PublishTransaction

Methods

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

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

Eq ReleaseOutputRequest 
Instance details

Defined in LndClient.Data.ReleaseOutput

Methods

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

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

Eq ReleaseOutputResponse 
Instance details

Defined in LndClient.Data.ReleaseOutput

Methods

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

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

Eq SendCoinsRequest 
Instance details

Defined in LndClient.Data.SendCoins

Methods

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

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

Eq SendCoinsResponse 
Instance details

Defined in LndClient.Data.SendCoins

Methods

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

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

Eq SendPaymentRequest 
Instance details

Defined in LndClient.Data.SendPayment

Methods

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

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

Eq SendPaymentResponse 
Instance details

Defined in LndClient.Data.SendPayment

Methods

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

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

Eq KeyLocator 
Instance details

Defined in LndClient.Data.SignMessage

Methods

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

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

Eq SignMessageRequest 
Instance details

Defined in LndClient.Data.SignMessage

Methods

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

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

Eq SignMessageResponse 
Instance details

Defined in LndClient.Data.SignMessage

Methods

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

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

Eq ChannelEventUpdate 
Instance details

Defined in LndClient.Data.SubscribeChannelEvents

Methods

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

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

Eq UpdateChannel 
Instance details

Defined in LndClient.Data.SubscribeChannelEvents

Methods

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

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

Eq UpdateType 
Instance details

Defined in LndClient.Data.SubscribeChannelEvents

Methods

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

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

Eq SubscribeInvoicesRequest 
Instance details

Defined in LndClient.Data.SubscribeInvoices

Methods

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

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

Eq TrackPaymentRequest 
Instance details

Defined in LndClient.Data.TrackPayment

Methods

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

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

Eq LnInitiator 
Instance details

Defined in LndClient.Data.Type

Methods

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

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

Eq LndError 
Instance details

Defined in LndClient.Data.Type

Eq LoggingMeta 
Instance details

Defined in LndClient.Data.Type

Methods

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

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

Eq VerifyMessageRequest 
Instance details

Defined in LndClient.Data.VerifyMessage

Methods

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

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

Eq VerifyMessageResponse 
Instance details

Defined in LndClient.Data.VerifyMessage

Methods

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

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

Eq WaitingCloseChannel 
Instance details

Defined in LndClient.Data.WaitingCloseChannel

Methods

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

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

Eq WalletBalance 
Instance details

Defined in LndClient.Data.WalletBalance

Methods

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

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

Eq AddHoldInvoiceRequest 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

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

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

Eq AddHoldInvoiceResp 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

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

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

Eq CancelInvoiceMsg 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

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

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

Eq CancelInvoiceResp 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

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

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

Eq LookupInvoiceMsg 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

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

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

Eq LookupInvoiceMsg'InvoiceRef 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

(==) :: LookupInvoiceMsg'InvoiceRef -> LookupInvoiceMsg'InvoiceRef -> Bool #

(/=) :: LookupInvoiceMsg'InvoiceRef -> LookupInvoiceMsg'InvoiceRef -> Bool #

Eq LookupModifier 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

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

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

Eq LookupModifier'UnrecognizedValue 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

(==) :: LookupModifier'UnrecognizedValue -> LookupModifier'UnrecognizedValue -> Bool #

(/=) :: LookupModifier'UnrecognizedValue -> LookupModifier'UnrecognizedValue -> Bool #

Eq SettleInvoiceMsg 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

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

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

Eq SettleInvoiceResp 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

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

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

Eq SubscribeSingleInvoiceRequest 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

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

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

Eq AddressType 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq AddressType'UnrecognizedValue 
Instance details

Defined in Proto.Lightning

Methods

(==) :: AddressType'UnrecognizedValue -> AddressType'UnrecognizedValue -> Bool #

(/=) :: AddressType'UnrecognizedValue -> AddressType'UnrecognizedValue -> Bool #

Eq BatchOpenChannel 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq BatchOpenChannelRequest 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq BatchOpenChannelResponse 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq Chain 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq ChannelAcceptRequest 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq ChannelAcceptResponse 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq ChannelCloseUpdate 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq ChannelOpenUpdate 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq CloseChannelRequest 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq CloseStatusUpdate 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq CloseStatusUpdate'Update 
Instance details

Defined in Proto.Lightning

Methods

(==) :: CloseStatusUpdate'Update -> CloseStatusUpdate'Update -> Bool #

(/=) :: CloseStatusUpdate'Update -> CloseStatusUpdate'Update -> Bool #

Eq ClosedChannelsRequest 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq ClosedChannelsResponse 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq ConfirmationUpdate 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq ConnectPeerRequest 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq ConnectPeerResponse 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq CustomMessage 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq DisconnectPeerRequest 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq DisconnectPeerResponse 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq EstimateFeeRequest 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq EstimateFeeRequest'AddrToAmountEntry 
Instance details

Defined in Proto.Lightning

Methods

(==) :: EstimateFeeRequest'AddrToAmountEntry -> EstimateFeeRequest'AddrToAmountEntry -> Bool #

(/=) :: EstimateFeeRequest'AddrToAmountEntry -> EstimateFeeRequest'AddrToAmountEntry -> Bool #

Eq EstimateFeeResponse 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq GetInfoRequest 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq GetInfoResponse 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq GetInfoResponse'FeaturesEntry 
Instance details

Defined in Proto.Lightning

Methods

(==) :: GetInfoResponse'FeaturesEntry -> GetInfoResponse'FeaturesEntry -> Bool #

(/=) :: GetInfoResponse'FeaturesEntry -> GetInfoResponse'FeaturesEntry -> Bool #

Eq GetRecoveryInfoRequest 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq GetRecoveryInfoResponse 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq GetTransactionsRequest 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq LightningAddress 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq ListChannelsRequest 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq ListChannelsResponse 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq ListPeersRequest 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq ListPeersResponse 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq ListUnspentRequest 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq ListUnspentResponse 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq NewAddressRequest 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq NewAddressResponse 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq OpenChannelRequest 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq OpenStatusUpdate 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq OpenStatusUpdate'Update 
Instance details

Defined in Proto.Lightning

Methods

(==) :: OpenStatusUpdate'Update -> OpenStatusUpdate'Update -> Bool #

(/=) :: OpenStatusUpdate'Update -> OpenStatusUpdate'Update -> Bool #

Eq Peer 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq Peer'FeaturesEntry 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq Peer'SyncType 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq Peer'SyncType'UnrecognizedValue 
Instance details

Defined in Proto.Lightning

Methods

(==) :: Peer'SyncType'UnrecognizedValue -> Peer'SyncType'UnrecognizedValue -> Bool #

(/=) :: Peer'SyncType'UnrecognizedValue -> Peer'SyncType'UnrecognizedValue -> Bool #

Eq PeerEvent 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq PeerEvent'EventType 
Instance details

Defined in Proto.Lightning

Methods

(==) :: PeerEvent'EventType -> PeerEvent'EventType -> Bool #

(/=) :: PeerEvent'EventType -> PeerEvent'EventType -> Bool #

Eq PeerEvent'EventType'UnrecognizedValue 
Instance details

Defined in Proto.Lightning

Methods

(==) :: PeerEvent'EventType'UnrecognizedValue -> PeerEvent'EventType'UnrecognizedValue -> Bool #

(/=) :: PeerEvent'EventType'UnrecognizedValue -> PeerEvent'EventType'UnrecognizedValue -> Bool #

Eq PeerEventSubscription 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq ReadyForPsbtFunding 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq SendCoinsRequest 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq SendCoinsResponse 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq SendCustomMessageRequest 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq SendCustomMessageResponse 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq SendManyRequest 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq SendManyRequest'AddrToAmountEntry 
Instance details

Defined in Proto.Lightning

Methods

(==) :: SendManyRequest'AddrToAmountEntry -> SendManyRequest'AddrToAmountEntry -> Bool #

(/=) :: SendManyRequest'AddrToAmountEntry -> SendManyRequest'AddrToAmountEntry -> Bool #

Eq SendManyResponse 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq SendRequest 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq SendRequest'DestCustomRecordsEntry 
Instance details

Defined in Proto.Lightning

Methods

(==) :: SendRequest'DestCustomRecordsEntry -> SendRequest'DestCustomRecordsEntry -> Bool #

(/=) :: SendRequest'DestCustomRecordsEntry -> SendRequest'DestCustomRecordsEntry -> Bool #

Eq SendResponse 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq SendToRouteRequest 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq SignMessageRequest 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq SignMessageResponse 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq SubscribeCustomMessagesRequest 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq TimestampedError 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq Transaction 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq TransactionDetails 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq Utxo 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq VerifyMessageRequest 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq VerifyMessageResponse 
Instance details

Defined in Proto.Lightning

Methods

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

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

Eq AMPRecord 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

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

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

Eq Amount 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

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

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

Eq ChanInfoRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

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

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

Eq ChanPointShim 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

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

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

Eq Channel 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

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

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

Eq ChannelBalanceRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

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

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

Eq ChannelBalanceResponse 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

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

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

Eq ChannelCloseSummary 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

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

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

Eq ChannelCloseSummary'ClosureType 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: ChannelCloseSummary'ClosureType -> ChannelCloseSummary'ClosureType -> Bool #

(/=) :: ChannelCloseSummary'ClosureType -> ChannelCloseSummary'ClosureType -> Bool #

Eq ChannelCloseSummary'ClosureType'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: ChannelCloseSummary'ClosureType'UnrecognizedValue -> ChannelCloseSummary'ClosureType'UnrecognizedValue -> Bool #

(/=) :: ChannelCloseSummary'ClosureType'UnrecognizedValue -> ChannelCloseSummary'ClosureType'UnrecognizedValue -> Bool #

Eq ChannelConstraints 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

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

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

Eq ChannelEdge 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

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

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

Eq ChannelEdgeUpdate 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

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

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

Eq ChannelEventSubscription 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

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

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

Eq ChannelEventUpdate 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

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

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

Eq ChannelEventUpdate'Channel 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

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

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

Eq ChannelEventUpdate'UpdateType 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: ChannelEventUpdate'UpdateType -> ChannelEventUpdate'UpdateType -> Bool #

(/=) :: ChannelEventUpdate'UpdateType -> ChannelEventUpdate'UpdateType -> Bool #

Eq ChannelEventUpdate'UpdateType'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: ChannelEventUpdate'UpdateType'UnrecognizedValue -> ChannelEventUpdate'UpdateType'UnrecognizedValue -> Bool #

(/=) :: ChannelEventUpdate'UpdateType'UnrecognizedValue -> ChannelEventUpdate'UpdateType'UnrecognizedValue -> Bool #

Eq ChannelGraph 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

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

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

Eq ChannelGraphRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: ChannelGraphRequest -> ChannelGraphRequest -> Bool #

(/=) :: ChannelGraphRequest -> ChannelGraphRequest -> Bool #

Eq ChannelPoint 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: ChannelPoint -> ChannelPoint -> Bool #

(/=) :: ChannelPoint -> ChannelPoint -> Bool #

Eq ChannelPoint'FundingTxid 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: ChannelPoint'FundingTxid -> ChannelPoint'FundingTxid -> Bool #

(/=) :: ChannelPoint'FundingTxid -> ChannelPoint'FundingTxid -> Bool #

Eq ClosedChannelUpdate 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: ClosedChannelUpdate -> ClosedChannelUpdate -> Bool #

(/=) :: ClosedChannelUpdate -> ClosedChannelUpdate -> Bool #

Eq CommitmentType 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: CommitmentType -> CommitmentType -> Bool #

(/=) :: CommitmentType -> CommitmentType -> Bool #

Eq CommitmentType'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: CommitmentType'UnrecognizedValue -> CommitmentType'UnrecognizedValue -> Bool #

(/=) :: CommitmentType'UnrecognizedValue -> CommitmentType'UnrecognizedValue -> Bool #

Eq EdgeLocator 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: EdgeLocator -> EdgeLocator -> Bool #

(/=) :: EdgeLocator -> EdgeLocator -> Bool #

Eq Feature 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: Feature -> Feature -> Bool #

(/=) :: Feature -> Feature -> Bool #

Eq FeatureBit 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: FeatureBit -> FeatureBit -> Bool #

(/=) :: FeatureBit -> FeatureBit -> Bool #

Eq FeatureBit'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: FeatureBit'UnrecognizedValue -> FeatureBit'UnrecognizedValue -> Bool #

(/=) :: FeatureBit'UnrecognizedValue -> FeatureBit'UnrecognizedValue -> Bool #

Eq FeeLimit 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: FeeLimit -> FeeLimit -> Bool #

(/=) :: FeeLimit -> FeeLimit -> Bool #

Eq FeeLimit'Limit 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: FeeLimit'Limit -> FeeLimit'Limit -> Bool #

(/=) :: FeeLimit'Limit -> FeeLimit'Limit -> Bool #

Eq FloatMetric 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: FloatMetric -> FloatMetric -> Bool #

(/=) :: FloatMetric -> FloatMetric -> Bool #

Eq FundingPsbtFinalize 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: FundingPsbtFinalize -> FundingPsbtFinalize -> Bool #

(/=) :: FundingPsbtFinalize -> FundingPsbtFinalize -> Bool #

Eq FundingPsbtVerify 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: FundingPsbtVerify -> FundingPsbtVerify -> Bool #

(/=) :: FundingPsbtVerify -> FundingPsbtVerify -> Bool #

Eq FundingShim 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: FundingShim -> FundingShim -> Bool #

(/=) :: FundingShim -> FundingShim -> Bool #

Eq FundingShim'Shim 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: FundingShim'Shim -> FundingShim'Shim -> Bool #

(/=) :: FundingShim'Shim -> FundingShim'Shim -> Bool #

Eq FundingShimCancel 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: FundingShimCancel -> FundingShimCancel -> Bool #

(/=) :: FundingShimCancel -> FundingShimCancel -> Bool #

Eq FundingStateStepResp 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: FundingStateStepResp -> FundingStateStepResp -> Bool #

(/=) :: FundingStateStepResp -> FundingStateStepResp -> Bool #

Eq FundingTransitionMsg 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: FundingTransitionMsg -> FundingTransitionMsg -> Bool #

(/=) :: FundingTransitionMsg -> FundingTransitionMsg -> Bool #

Eq FundingTransitionMsg'Trigger 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: FundingTransitionMsg'Trigger -> FundingTransitionMsg'Trigger -> Bool #

(/=) :: FundingTransitionMsg'Trigger -> FundingTransitionMsg'Trigger -> Bool #

Eq GraphTopologySubscription 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: GraphTopologySubscription -> GraphTopologySubscription -> Bool #

(/=) :: GraphTopologySubscription -> GraphTopologySubscription -> Bool #

Eq GraphTopologyUpdate 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: GraphTopologyUpdate -> GraphTopologyUpdate -> Bool #

(/=) :: GraphTopologyUpdate -> GraphTopologyUpdate -> Bool #

Eq HTLC 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: HTLC -> HTLC -> Bool #

(/=) :: HTLC -> HTLC -> Bool #

Eq Hop 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: Hop -> Hop -> Bool #

(/=) :: Hop -> Hop -> Bool #

Eq Hop'CustomRecordsEntry 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: Hop'CustomRecordsEntry -> Hop'CustomRecordsEntry -> Bool #

(/=) :: Hop'CustomRecordsEntry -> Hop'CustomRecordsEntry -> Bool #

Eq HopHint 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: HopHint -> HopHint -> Bool #

(/=) :: HopHint -> HopHint -> Bool #

Eq Initiator 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: Initiator -> Initiator -> Bool #

(/=) :: Initiator -> Initiator -> Bool #

Eq Initiator'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: Initiator'UnrecognizedValue -> Initiator'UnrecognizedValue -> Bool #

(/=) :: Initiator'UnrecognizedValue -> Initiator'UnrecognizedValue -> Bool #

Eq KeyDescriptor 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: KeyDescriptor -> KeyDescriptor -> Bool #

(/=) :: KeyDescriptor -> KeyDescriptor -> Bool #

Eq KeyLocator 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: KeyLocator -> KeyLocator -> Bool #

(/=) :: KeyLocator -> KeyLocator -> Bool #

Eq LightningNode 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: LightningNode -> LightningNode -> Bool #

(/=) :: LightningNode -> LightningNode -> Bool #

Eq LightningNode'FeaturesEntry 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: LightningNode'FeaturesEntry -> LightningNode'FeaturesEntry -> Bool #

(/=) :: LightningNode'FeaturesEntry -> LightningNode'FeaturesEntry -> Bool #

Eq MPPRecord 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: MPPRecord -> MPPRecord -> Bool #

(/=) :: MPPRecord -> MPPRecord -> Bool #

Eq NetworkInfo 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: NetworkInfo -> NetworkInfo -> Bool #

(/=) :: NetworkInfo -> NetworkInfo -> Bool #

Eq NetworkInfoRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: NetworkInfoRequest -> NetworkInfoRequest -> Bool #

(/=) :: NetworkInfoRequest -> NetworkInfoRequest -> Bool #

Eq NodeAddress 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: NodeAddress -> NodeAddress -> Bool #

(/=) :: NodeAddress -> NodeAddress -> Bool #

Eq NodeInfo 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: NodeInfo -> NodeInfo -> Bool #

(/=) :: NodeInfo -> NodeInfo -> Bool #

Eq NodeInfoRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: NodeInfoRequest -> NodeInfoRequest -> Bool #

(/=) :: NodeInfoRequest -> NodeInfoRequest -> Bool #

Eq NodeMetricType 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: NodeMetricType -> NodeMetricType -> Bool #

(/=) :: NodeMetricType -> NodeMetricType -> Bool #

Eq NodeMetricType'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: NodeMetricType'UnrecognizedValue -> NodeMetricType'UnrecognizedValue -> Bool #

(/=) :: NodeMetricType'UnrecognizedValue -> NodeMetricType'UnrecognizedValue -> Bool #

Eq NodeMetricsRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: NodeMetricsRequest -> NodeMetricsRequest -> Bool #

(/=) :: NodeMetricsRequest -> NodeMetricsRequest -> Bool #

Eq NodeMetricsResponse 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: NodeMetricsResponse -> NodeMetricsResponse -> Bool #

(/=) :: NodeMetricsResponse -> NodeMetricsResponse -> Bool #

Eq NodeMetricsResponse'BetweennessCentralityEntry 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: NodeMetricsResponse'BetweennessCentralityEntry -> NodeMetricsResponse'BetweennessCentralityEntry -> Bool #

(/=) :: NodeMetricsResponse'BetweennessCentralityEntry -> NodeMetricsResponse'BetweennessCentralityEntry -> Bool #

Eq NodePair 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: NodePair -> NodePair -> Bool #

(/=) :: NodePair -> NodePair -> Bool #

Eq NodeUpdate 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: NodeUpdate -> NodeUpdate -> Bool #

(/=) :: NodeUpdate -> NodeUpdate -> Bool #

Eq NodeUpdate'FeaturesEntry 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: NodeUpdate'FeaturesEntry -> NodeUpdate'FeaturesEntry -> Bool #

(/=) :: NodeUpdate'FeaturesEntry -> NodeUpdate'FeaturesEntry -> Bool #

Eq OutPoint 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: OutPoint -> OutPoint -> Bool #

(/=) :: OutPoint -> OutPoint -> Bool #

Eq PendingChannelsRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: PendingChannelsRequest -> PendingChannelsRequest -> Bool #

(/=) :: PendingChannelsRequest -> PendingChannelsRequest -> Bool #

Eq PendingChannelsResponse 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: PendingChannelsResponse -> PendingChannelsResponse -> Bool #

(/=) :: PendingChannelsResponse -> PendingChannelsResponse -> Bool #

Eq PendingChannelsResponse'ClosedChannel 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: PendingChannelsResponse'ClosedChannel -> PendingChannelsResponse'ClosedChannel -> Bool #

(/=) :: PendingChannelsResponse'ClosedChannel -> PendingChannelsResponse'ClosedChannel -> Bool #

Eq PendingChannelsResponse'Commitments 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: PendingChannelsResponse'Commitments -> PendingChannelsResponse'Commitments -> Bool #

(/=) :: PendingChannelsResponse'Commitments -> PendingChannelsResponse'Commitments -> Bool #

Eq PendingChannelsResponse'ForceClosedChannel 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: PendingChannelsResponse'ForceClosedChannel -> PendingChannelsResponse'ForceClosedChannel -> Bool #

(/=) :: PendingChannelsResponse'ForceClosedChannel -> PendingChannelsResponse'ForceClosedChannel -> Bool #

Eq PendingChannelsResponse'ForceClosedChannel'AnchorState 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: PendingChannelsResponse'ForceClosedChannel'AnchorState -> PendingChannelsResponse'ForceClosedChannel'AnchorState -> Bool #

(/=) :: PendingChannelsResponse'ForceClosedChannel'AnchorState -> PendingChannelsResponse'ForceClosedChannel'AnchorState -> Bool #

Eq PendingChannelsResponse'ForceClosedChannel'AnchorState'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: PendingChannelsResponse'ForceClosedChannel'AnchorState'UnrecognizedValue -> PendingChannelsResponse'ForceClosedChannel'AnchorState'UnrecognizedValue -> Bool #

(/=) :: PendingChannelsResponse'ForceClosedChannel'AnchorState'UnrecognizedValue -> PendingChannelsResponse'ForceClosedChannel'AnchorState'UnrecognizedValue -> Bool #

Eq PendingChannelsResponse'PendingChannel 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: PendingChannelsResponse'PendingChannel -> PendingChannelsResponse'PendingChannel -> Bool #

(/=) :: PendingChannelsResponse'PendingChannel -> PendingChannelsResponse'PendingChannel -> Bool #

Eq PendingChannelsResponse'PendingOpenChannel 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: PendingChannelsResponse'PendingOpenChannel -> PendingChannelsResponse'PendingOpenChannel -> Bool #

(/=) :: PendingChannelsResponse'PendingOpenChannel -> PendingChannelsResponse'PendingOpenChannel -> Bool #

Eq PendingChannelsResponse'WaitingCloseChannel 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: PendingChannelsResponse'WaitingCloseChannel -> PendingChannelsResponse'WaitingCloseChannel -> Bool #

(/=) :: PendingChannelsResponse'WaitingCloseChannel -> PendingChannelsResponse'WaitingCloseChannel -> Bool #

Eq PendingHTLC 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: PendingHTLC -> PendingHTLC -> Bool #

(/=) :: PendingHTLC -> PendingHTLC -> Bool #

Eq PendingUpdate 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: PendingUpdate -> PendingUpdate -> Bool #

(/=) :: PendingUpdate -> PendingUpdate -> Bool #

Eq PsbtShim 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: PsbtShim -> PsbtShim -> Bool #

(/=) :: PsbtShim -> PsbtShim -> Bool #

Eq QueryRoutesRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: QueryRoutesRequest -> QueryRoutesRequest -> Bool #

(/=) :: QueryRoutesRequest -> QueryRoutesRequest -> Bool #

Eq QueryRoutesRequest'DestCustomRecordsEntry 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: QueryRoutesRequest'DestCustomRecordsEntry -> QueryRoutesRequest'DestCustomRecordsEntry -> Bool #

(/=) :: QueryRoutesRequest'DestCustomRecordsEntry -> QueryRoutesRequest'DestCustomRecordsEntry -> Bool #

Eq QueryRoutesResponse 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: QueryRoutesResponse -> QueryRoutesResponse -> Bool #

(/=) :: QueryRoutesResponse -> QueryRoutesResponse -> Bool #

Eq Resolution 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: Resolution -> Resolution -> Bool #

(/=) :: Resolution -> Resolution -> Bool #

Eq ResolutionOutcome 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: ResolutionOutcome -> ResolutionOutcome -> Bool #

(/=) :: ResolutionOutcome -> ResolutionOutcome -> Bool #

Eq ResolutionOutcome'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: ResolutionOutcome'UnrecognizedValue -> ResolutionOutcome'UnrecognizedValue -> Bool #

(/=) :: ResolutionOutcome'UnrecognizedValue -> ResolutionOutcome'UnrecognizedValue -> Bool #

Eq ResolutionType 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: ResolutionType -> ResolutionType -> Bool #

(/=) :: ResolutionType -> ResolutionType -> Bool #

Eq ResolutionType'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: ResolutionType'UnrecognizedValue -> ResolutionType'UnrecognizedValue -> Bool #

(/=) :: ResolutionType'UnrecognizedValue -> ResolutionType'UnrecognizedValue -> Bool #

Eq Route 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: Route -> Route -> Bool #

(/=) :: Route -> Route -> Bool #

Eq RouteHint 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: RouteHint -> RouteHint -> Bool #

(/=) :: RouteHint -> RouteHint -> Bool #

Eq RoutingPolicy 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: RoutingPolicy -> RoutingPolicy -> Bool #

(/=) :: RoutingPolicy -> RoutingPolicy -> Bool #

Eq StopRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: StopRequest -> StopRequest -> Bool #

(/=) :: StopRequest -> StopRequest -> Bool #

Eq StopResponse 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: StopResponse -> StopResponse -> Bool #

(/=) :: StopResponse -> StopResponse -> Bool #

Eq WalletAccountBalance 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: WalletAccountBalance -> WalletAccountBalance -> Bool #

(/=) :: WalletAccountBalance -> WalletAccountBalance -> Bool #

Eq WalletBalanceRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: WalletBalanceRequest -> WalletBalanceRequest -> Bool #

(/=) :: WalletBalanceRequest -> WalletBalanceRequest -> Bool #

Eq WalletBalanceResponse 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: WalletBalanceResponse -> WalletBalanceResponse -> Bool #

(/=) :: WalletBalanceResponse -> WalletBalanceResponse -> Bool #

Eq WalletBalanceResponse'AccountBalanceEntry 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

(==) :: WalletBalanceResponse'AccountBalanceEntry -> WalletBalanceResponse'AccountBalanceEntry -> Bool #

(/=) :: WalletBalanceResponse'AccountBalanceEntry -> WalletBalanceResponse'AccountBalanceEntry -> Bool #

Eq AMP 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: AMP -> AMP -> Bool #

(/=) :: AMP -> AMP -> Bool #

Eq AMPInvoiceState 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: AMPInvoiceState -> AMPInvoiceState -> Bool #

(/=) :: AMPInvoiceState -> AMPInvoiceState -> Bool #

Eq AbandonChannelRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: AbandonChannelRequest -> AbandonChannelRequest -> Bool #

(/=) :: AbandonChannelRequest -> AbandonChannelRequest -> Bool #

Eq AbandonChannelResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: AbandonChannelResponse -> AbandonChannelResponse -> Bool #

(/=) :: AbandonChannelResponse -> AbandonChannelResponse -> Bool #

Eq AddInvoiceResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: AddInvoiceResponse -> AddInvoiceResponse -> Bool #

(/=) :: AddInvoiceResponse -> AddInvoiceResponse -> Bool #

Eq BakeMacaroonRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: BakeMacaroonRequest -> BakeMacaroonRequest -> Bool #

(/=) :: BakeMacaroonRequest -> BakeMacaroonRequest -> Bool #

Eq BakeMacaroonResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: BakeMacaroonResponse -> BakeMacaroonResponse -> Bool #

(/=) :: BakeMacaroonResponse -> BakeMacaroonResponse -> Bool #

Eq ChanBackupExportRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: ChanBackupExportRequest -> ChanBackupExportRequest -> Bool #

(/=) :: ChanBackupExportRequest -> ChanBackupExportRequest -> Bool #

Eq ChanBackupSnapshot 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: ChanBackupSnapshot -> ChanBackupSnapshot -> Bool #

(/=) :: ChanBackupSnapshot -> ChanBackupSnapshot -> Bool #

Eq ChannelBackup 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: ChannelBackup -> ChannelBackup -> Bool #

(/=) :: ChannelBackup -> ChannelBackup -> Bool #

Eq ChannelBackupSubscription 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: ChannelBackupSubscription -> ChannelBackupSubscription -> Bool #

(/=) :: ChannelBackupSubscription -> ChannelBackupSubscription -> Bool #

Eq ChannelBackups 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: ChannelBackups -> ChannelBackups -> Bool #

(/=) :: ChannelBackups -> ChannelBackups -> Bool #

Eq ChannelFeeReport 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: ChannelFeeReport -> ChannelFeeReport -> Bool #

(/=) :: ChannelFeeReport -> ChannelFeeReport -> Bool #

Eq ChannelUpdate 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: ChannelUpdate -> ChannelUpdate -> Bool #

(/=) :: ChannelUpdate -> ChannelUpdate -> Bool #

Eq CheckMacPermRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: CheckMacPermRequest -> CheckMacPermRequest -> Bool #

(/=) :: CheckMacPermRequest -> CheckMacPermRequest -> Bool #

Eq CheckMacPermResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: CheckMacPermResponse -> CheckMacPermResponse -> Bool #

(/=) :: CheckMacPermResponse -> CheckMacPermResponse -> Bool #

Eq DebugLevelRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: DebugLevelRequest -> DebugLevelRequest -> Bool #

(/=) :: DebugLevelRequest -> DebugLevelRequest -> Bool #

Eq DebugLevelResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: DebugLevelResponse -> DebugLevelResponse -> Bool #

(/=) :: DebugLevelResponse -> DebugLevelResponse -> Bool #

Eq DeleteAllPaymentsRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: DeleteAllPaymentsRequest -> DeleteAllPaymentsRequest -> Bool #

(/=) :: DeleteAllPaymentsRequest -> DeleteAllPaymentsRequest -> Bool #

Eq DeleteAllPaymentsResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: DeleteAllPaymentsResponse -> DeleteAllPaymentsResponse -> Bool #

(/=) :: DeleteAllPaymentsResponse -> DeleteAllPaymentsResponse -> Bool #

Eq DeleteMacaroonIDRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: DeleteMacaroonIDRequest -> DeleteMacaroonIDRequest -> Bool #

(/=) :: DeleteMacaroonIDRequest -> DeleteMacaroonIDRequest -> Bool #

Eq DeleteMacaroonIDResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: DeleteMacaroonIDResponse -> DeleteMacaroonIDResponse -> Bool #

(/=) :: DeleteMacaroonIDResponse -> DeleteMacaroonIDResponse -> Bool #

Eq DeletePaymentRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: DeletePaymentRequest -> DeletePaymentRequest -> Bool #

(/=) :: DeletePaymentRequest -> DeletePaymentRequest -> Bool #

Eq DeletePaymentResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: DeletePaymentResponse -> DeletePaymentResponse -> Bool #

(/=) :: DeletePaymentResponse -> DeletePaymentResponse -> Bool #

Eq ExportChannelBackupRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: ExportChannelBackupRequest -> ExportChannelBackupRequest -> Bool #

(/=) :: ExportChannelBackupRequest -> ExportChannelBackupRequest -> Bool #

Eq FailedUpdate 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: FailedUpdate -> FailedUpdate -> Bool #

(/=) :: FailedUpdate -> FailedUpdate -> Bool #

Eq Failure 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: Failure -> Failure -> Bool #

(/=) :: Failure -> Failure -> Bool #

Eq Failure'FailureCode 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: Failure'FailureCode -> Failure'FailureCode -> Bool #

(/=) :: Failure'FailureCode -> Failure'FailureCode -> Bool #

Eq Failure'FailureCode'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: Failure'FailureCode'UnrecognizedValue -> Failure'FailureCode'UnrecognizedValue -> Bool #

(/=) :: Failure'FailureCode'UnrecognizedValue -> Failure'FailureCode'UnrecognizedValue -> Bool #

Eq FeeReportRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: FeeReportRequest -> FeeReportRequest -> Bool #

(/=) :: FeeReportRequest -> FeeReportRequest -> Bool #

Eq FeeReportResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: FeeReportResponse -> FeeReportResponse -> Bool #

(/=) :: FeeReportResponse -> FeeReportResponse -> Bool #

Eq ForwardingEvent 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: ForwardingEvent -> ForwardingEvent -> Bool #

(/=) :: ForwardingEvent -> ForwardingEvent -> Bool #

Eq ForwardingHistoryRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: ForwardingHistoryRequest -> ForwardingHistoryRequest -> Bool #

(/=) :: ForwardingHistoryRequest -> ForwardingHistoryRequest -> Bool #

Eq ForwardingHistoryResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: ForwardingHistoryResponse -> ForwardingHistoryResponse -> Bool #

(/=) :: ForwardingHistoryResponse -> ForwardingHistoryResponse -> Bool #

Eq HTLCAttempt 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: HTLCAttempt -> HTLCAttempt -> Bool #

(/=) :: HTLCAttempt -> HTLCAttempt -> Bool #

Eq HTLCAttempt'HTLCStatus 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: HTLCAttempt'HTLCStatus -> HTLCAttempt'HTLCStatus -> Bool #

(/=) :: HTLCAttempt'HTLCStatus -> HTLCAttempt'HTLCStatus -> Bool #

Eq HTLCAttempt'HTLCStatus'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: HTLCAttempt'HTLCStatus'UnrecognizedValue -> HTLCAttempt'HTLCStatus'UnrecognizedValue -> Bool #

(/=) :: HTLCAttempt'HTLCStatus'UnrecognizedValue -> HTLCAttempt'HTLCStatus'UnrecognizedValue -> Bool #

Eq InterceptFeedback 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: InterceptFeedback -> InterceptFeedback -> Bool #

(/=) :: InterceptFeedback -> InterceptFeedback -> Bool #

Eq Invoice 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: Invoice -> Invoice -> Bool #

(/=) :: Invoice -> Invoice -> Bool #

Eq Invoice'AmpInvoiceStateEntry 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: Invoice'AmpInvoiceStateEntry -> Invoice'AmpInvoiceStateEntry -> Bool #

(/=) :: Invoice'AmpInvoiceStateEntry -> Invoice'AmpInvoiceStateEntry -> Bool #

Eq Invoice'FeaturesEntry 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: Invoice'FeaturesEntry -> Invoice'FeaturesEntry -> Bool #

(/=) :: Invoice'FeaturesEntry -> Invoice'FeaturesEntry -> Bool #

Eq Invoice'InvoiceState 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: Invoice'InvoiceState -> Invoice'InvoiceState -> Bool #

(/=) :: Invoice'InvoiceState -> Invoice'InvoiceState -> Bool #

Eq Invoice'InvoiceState'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: Invoice'InvoiceState'UnrecognizedValue -> Invoice'InvoiceState'UnrecognizedValue -> Bool #

(/=) :: Invoice'InvoiceState'UnrecognizedValue -> Invoice'InvoiceState'UnrecognizedValue -> Bool #

Eq InvoiceHTLC 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: InvoiceHTLC -> InvoiceHTLC -> Bool #

(/=) :: InvoiceHTLC -> InvoiceHTLC -> Bool #

Eq InvoiceHTLC'CustomRecordsEntry 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: InvoiceHTLC'CustomRecordsEntry -> InvoiceHTLC'CustomRecordsEntry -> Bool #

(/=) :: InvoiceHTLC'CustomRecordsEntry -> InvoiceHTLC'CustomRecordsEntry -> Bool #

Eq InvoiceHTLCState 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: InvoiceHTLCState -> InvoiceHTLCState -> Bool #

(/=) :: InvoiceHTLCState -> InvoiceHTLCState -> Bool #

Eq InvoiceHTLCState'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: InvoiceHTLCState'UnrecognizedValue -> InvoiceHTLCState'UnrecognizedValue -> Bool #

(/=) :: InvoiceHTLCState'UnrecognizedValue -> InvoiceHTLCState'UnrecognizedValue -> Bool #

Eq InvoiceSubscription 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: InvoiceSubscription -> InvoiceSubscription -> Bool #

(/=) :: InvoiceSubscription -> InvoiceSubscription -> Bool #

Eq ListInvoiceRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: ListInvoiceRequest -> ListInvoiceRequest -> Bool #

(/=) :: ListInvoiceRequest -> ListInvoiceRequest -> Bool #

Eq ListInvoiceResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: ListInvoiceResponse -> ListInvoiceResponse -> Bool #

(/=) :: ListInvoiceResponse -> ListInvoiceResponse -> Bool #

Eq ListMacaroonIDsRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: ListMacaroonIDsRequest -> ListMacaroonIDsRequest -> Bool #

(/=) :: ListMacaroonIDsRequest -> ListMacaroonIDsRequest -> Bool #

Eq ListMacaroonIDsResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: ListMacaroonIDsResponse -> ListMacaroonIDsResponse -> Bool #

(/=) :: ListMacaroonIDsResponse -> ListMacaroonIDsResponse -> Bool #

Eq ListPaymentsRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: ListPaymentsRequest -> ListPaymentsRequest -> Bool #

(/=) :: ListPaymentsRequest -> ListPaymentsRequest -> Bool #

Eq ListPaymentsResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: ListPaymentsResponse -> ListPaymentsResponse -> Bool #

(/=) :: ListPaymentsResponse -> ListPaymentsResponse -> Bool #

Eq ListPermissionsRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: ListPermissionsRequest -> ListPermissionsRequest -> Bool #

(/=) :: ListPermissionsRequest -> ListPermissionsRequest -> Bool #

Eq ListPermissionsResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: ListPermissionsResponse -> ListPermissionsResponse -> Bool #

(/=) :: ListPermissionsResponse -> ListPermissionsResponse -> Bool #

Eq ListPermissionsResponse'MethodPermissionsEntry 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: ListPermissionsResponse'MethodPermissionsEntry -> ListPermissionsResponse'MethodPermissionsEntry -> Bool #

(/=) :: ListPermissionsResponse'MethodPermissionsEntry -> ListPermissionsResponse'MethodPermissionsEntry -> Bool #

Eq MacaroonId 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: MacaroonId -> MacaroonId -> Bool #

(/=) :: MacaroonId -> MacaroonId -> Bool #

Eq MacaroonPermission 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: MacaroonPermission -> MacaroonPermission -> Bool #

(/=) :: MacaroonPermission -> MacaroonPermission -> Bool #

Eq MacaroonPermissionList 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: MacaroonPermissionList -> MacaroonPermissionList -> Bool #

(/=) :: MacaroonPermissionList -> MacaroonPermissionList -> Bool #

Eq MiddlewareRegistration 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: MiddlewareRegistration -> MiddlewareRegistration -> Bool #

(/=) :: MiddlewareRegistration -> MiddlewareRegistration -> Bool #

Eq MultiChanBackup 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: MultiChanBackup -> MultiChanBackup -> Bool #

(/=) :: MultiChanBackup -> MultiChanBackup -> Bool #

Eq Op 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: Op -> Op -> Bool #

(/=) :: Op -> Op -> Bool #

Eq PayReq 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: PayReq -> PayReq -> Bool #

(/=) :: PayReq -> PayReq -> Bool #

Eq PayReq'FeaturesEntry 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: PayReq'FeaturesEntry -> PayReq'FeaturesEntry -> Bool #

(/=) :: PayReq'FeaturesEntry -> PayReq'FeaturesEntry -> Bool #

Eq PayReqString 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: PayReqString -> PayReqString -> Bool #

(/=) :: PayReqString -> PayReqString -> Bool #

Eq Payment 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: Payment -> Payment -> Bool #

(/=) :: Payment -> Payment -> Bool #

Eq Payment'PaymentStatus 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: Payment'PaymentStatus -> Payment'PaymentStatus -> Bool #

(/=) :: Payment'PaymentStatus -> Payment'PaymentStatus -> Bool #

Eq Payment'PaymentStatus'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: Payment'PaymentStatus'UnrecognizedValue -> Payment'PaymentStatus'UnrecognizedValue -> Bool #

(/=) :: Payment'PaymentStatus'UnrecognizedValue -> Payment'PaymentStatus'UnrecognizedValue -> Bool #

Eq PaymentFailureReason 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: PaymentFailureReason -> PaymentFailureReason -> Bool #

(/=) :: PaymentFailureReason -> PaymentFailureReason -> Bool #

Eq PaymentFailureReason'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: PaymentFailureReason'UnrecognizedValue -> PaymentFailureReason'UnrecognizedValue -> Bool #

(/=) :: PaymentFailureReason'UnrecognizedValue -> PaymentFailureReason'UnrecognizedValue -> Bool #

Eq PaymentHash 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: PaymentHash -> PaymentHash -> Bool #

(/=) :: PaymentHash -> PaymentHash -> Bool #

Eq PolicyUpdateRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: PolicyUpdateRequest -> PolicyUpdateRequest -> Bool #

(/=) :: PolicyUpdateRequest -> PolicyUpdateRequest -> Bool #

Eq PolicyUpdateRequest'Scope 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: PolicyUpdateRequest'Scope -> PolicyUpdateRequest'Scope -> Bool #

(/=) :: PolicyUpdateRequest'Scope -> PolicyUpdateRequest'Scope -> Bool #

Eq PolicyUpdateResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: PolicyUpdateResponse -> PolicyUpdateResponse -> Bool #

(/=) :: PolicyUpdateResponse -> PolicyUpdateResponse -> Bool #

Eq RPCMessage 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: RPCMessage -> RPCMessage -> Bool #

(/=) :: RPCMessage -> RPCMessage -> Bool #

Eq RPCMiddlewareRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: RPCMiddlewareRequest -> RPCMiddlewareRequest -> Bool #

(/=) :: RPCMiddlewareRequest -> RPCMiddlewareRequest -> Bool #

Eq RPCMiddlewareRequest'InterceptType 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: RPCMiddlewareRequest'InterceptType -> RPCMiddlewareRequest'InterceptType -> Bool #

(/=) :: RPCMiddlewareRequest'InterceptType -> RPCMiddlewareRequest'InterceptType -> Bool #

Eq RPCMiddlewareResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: RPCMiddlewareResponse -> RPCMiddlewareResponse -> Bool #

(/=) :: RPCMiddlewareResponse -> RPCMiddlewareResponse -> Bool #

Eq RPCMiddlewareResponse'MiddlewareMessage 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: RPCMiddlewareResponse'MiddlewareMessage -> RPCMiddlewareResponse'MiddlewareMessage -> Bool #

(/=) :: RPCMiddlewareResponse'MiddlewareMessage -> RPCMiddlewareResponse'MiddlewareMessage -> Bool #

Eq RestoreBackupResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: RestoreBackupResponse -> RestoreBackupResponse -> Bool #

(/=) :: RestoreBackupResponse -> RestoreBackupResponse -> Bool #

Eq RestoreChanBackupRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: RestoreChanBackupRequest -> RestoreChanBackupRequest -> Bool #

(/=) :: RestoreChanBackupRequest -> RestoreChanBackupRequest -> Bool #

Eq RestoreChanBackupRequest'Backup 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: RestoreChanBackupRequest'Backup -> RestoreChanBackupRequest'Backup -> Bool #

(/=) :: RestoreChanBackupRequest'Backup -> RestoreChanBackupRequest'Backup -> Bool #

Eq SetID 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: SetID -> SetID -> Bool #

(/=) :: SetID -> SetID -> Bool #

Eq StreamAuth 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: StreamAuth -> StreamAuth -> Bool #

(/=) :: StreamAuth -> StreamAuth -> Bool #

Eq UpdateFailure 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: UpdateFailure -> UpdateFailure -> Bool #

(/=) :: UpdateFailure -> UpdateFailure -> Bool #

Eq UpdateFailure'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: UpdateFailure'UnrecognizedValue -> UpdateFailure'UnrecognizedValue -> Bool #

(/=) :: UpdateFailure'UnrecognizedValue -> UpdateFailure'UnrecognizedValue -> Bool #

Eq VerifyChanBackupResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

(==) :: VerifyChanBackupResponse -> VerifyChanBackupResponse -> Bool #

(/=) :: VerifyChanBackupResponse -> VerifyChanBackupResponse -> Bool #

Eq BuildRouteRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: BuildRouteRequest -> BuildRouteRequest -> Bool #

(/=) :: BuildRouteRequest -> BuildRouteRequest -> Bool #

Eq BuildRouteResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: BuildRouteResponse -> BuildRouteResponse -> Bool #

(/=) :: BuildRouteResponse -> BuildRouteResponse -> Bool #

Eq ChanStatusAction 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: ChanStatusAction -> ChanStatusAction -> Bool #

(/=) :: ChanStatusAction -> ChanStatusAction -> Bool #

Eq ChanStatusAction'UnrecognizedValue 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: ChanStatusAction'UnrecognizedValue -> ChanStatusAction'UnrecognizedValue -> Bool #

(/=) :: ChanStatusAction'UnrecognizedValue -> ChanStatusAction'UnrecognizedValue -> Bool #

Eq CircuitKey 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: CircuitKey -> CircuitKey -> Bool #

(/=) :: CircuitKey -> CircuitKey -> Bool #

Eq FailureDetail 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: FailureDetail -> FailureDetail -> Bool #

(/=) :: FailureDetail -> FailureDetail -> Bool #

Eq FailureDetail'UnrecognizedValue 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: FailureDetail'UnrecognizedValue -> FailureDetail'UnrecognizedValue -> Bool #

(/=) :: FailureDetail'UnrecognizedValue -> FailureDetail'UnrecognizedValue -> Bool #

Eq ForwardEvent 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: ForwardEvent -> ForwardEvent -> Bool #

(/=) :: ForwardEvent -> ForwardEvent -> Bool #

Eq ForwardFailEvent 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: ForwardFailEvent -> ForwardFailEvent -> Bool #

(/=) :: ForwardFailEvent -> ForwardFailEvent -> Bool #

Eq ForwardHtlcInterceptRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: ForwardHtlcInterceptRequest -> ForwardHtlcInterceptRequest -> Bool #

(/=) :: ForwardHtlcInterceptRequest -> ForwardHtlcInterceptRequest -> Bool #

Eq ForwardHtlcInterceptRequest'CustomRecordsEntry 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: ForwardHtlcInterceptRequest'CustomRecordsEntry -> ForwardHtlcInterceptRequest'CustomRecordsEntry -> Bool #

(/=) :: ForwardHtlcInterceptRequest'CustomRecordsEntry -> ForwardHtlcInterceptRequest'CustomRecordsEntry -> Bool #

Eq ForwardHtlcInterceptResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: ForwardHtlcInterceptResponse -> ForwardHtlcInterceptResponse -> Bool #

(/=) :: ForwardHtlcInterceptResponse -> ForwardHtlcInterceptResponse -> Bool #

Eq GetMissionControlConfigRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: GetMissionControlConfigRequest -> GetMissionControlConfigRequest -> Bool #

(/=) :: GetMissionControlConfigRequest -> GetMissionControlConfigRequest -> Bool #

Eq GetMissionControlConfigResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: GetMissionControlConfigResponse -> GetMissionControlConfigResponse -> Bool #

(/=) :: GetMissionControlConfigResponse -> GetMissionControlConfigResponse -> Bool #

Eq HtlcEvent 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: HtlcEvent -> HtlcEvent -> Bool #

(/=) :: HtlcEvent -> HtlcEvent -> Bool #

Eq HtlcEvent'Event 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: HtlcEvent'Event -> HtlcEvent'Event -> Bool #

(/=) :: HtlcEvent'Event -> HtlcEvent'Event -> Bool #

Eq HtlcEvent'EventType 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: HtlcEvent'EventType -> HtlcEvent'EventType -> Bool #

(/=) :: HtlcEvent'EventType -> HtlcEvent'EventType -> Bool #

Eq HtlcEvent'EventType'UnrecognizedValue 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: HtlcEvent'EventType'UnrecognizedValue -> HtlcEvent'EventType'UnrecognizedValue -> Bool #

(/=) :: HtlcEvent'EventType'UnrecognizedValue -> HtlcEvent'EventType'UnrecognizedValue -> Bool #

Eq HtlcInfo 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: HtlcInfo -> HtlcInfo -> Bool #

(/=) :: HtlcInfo -> HtlcInfo -> Bool #

Eq LinkFailEvent 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: LinkFailEvent -> LinkFailEvent -> Bool #

(/=) :: LinkFailEvent -> LinkFailEvent -> Bool #

Eq MissionControlConfig 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: MissionControlConfig -> MissionControlConfig -> Bool #

(/=) :: MissionControlConfig -> MissionControlConfig -> Bool #

Eq PairData 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: PairData -> PairData -> Bool #

(/=) :: PairData -> PairData -> Bool #

Eq PairHistory 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: PairHistory -> PairHistory -> Bool #

(/=) :: PairHistory -> PairHistory -> Bool #

Eq PaymentState 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: PaymentState -> PaymentState -> Bool #

(/=) :: PaymentState -> PaymentState -> Bool #

Eq PaymentState'UnrecognizedValue 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: PaymentState'UnrecognizedValue -> PaymentState'UnrecognizedValue -> Bool #

(/=) :: PaymentState'UnrecognizedValue -> PaymentState'UnrecognizedValue -> Bool #

Eq PaymentStatus 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: PaymentStatus -> PaymentStatus -> Bool #

(/=) :: PaymentStatus -> PaymentStatus -> Bool #

Eq QueryMissionControlRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: QueryMissionControlRequest -> QueryMissionControlRequest -> Bool #

(/=) :: QueryMissionControlRequest -> QueryMissionControlRequest -> Bool #

Eq QueryMissionControlResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: QueryMissionControlResponse -> QueryMissionControlResponse -> Bool #

(/=) :: QueryMissionControlResponse -> QueryMissionControlResponse -> Bool #

Eq QueryProbabilityRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: QueryProbabilityRequest -> QueryProbabilityRequest -> Bool #

(/=) :: QueryProbabilityRequest -> QueryProbabilityRequest -> Bool #

Eq QueryProbabilityResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: QueryProbabilityResponse -> QueryProbabilityResponse -> Bool #

(/=) :: QueryProbabilityResponse -> QueryProbabilityResponse -> Bool #

Eq ResetMissionControlRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: ResetMissionControlRequest -> ResetMissionControlRequest -> Bool #

(/=) :: ResetMissionControlRequest -> ResetMissionControlRequest -> Bool #

Eq ResetMissionControlResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: ResetMissionControlResponse -> ResetMissionControlResponse -> Bool #

(/=) :: ResetMissionControlResponse -> ResetMissionControlResponse -> Bool #

Eq ResolveHoldForwardAction 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: ResolveHoldForwardAction -> ResolveHoldForwardAction -> Bool #

(/=) :: ResolveHoldForwardAction -> ResolveHoldForwardAction -> Bool #

Eq ResolveHoldForwardAction'UnrecognizedValue 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: ResolveHoldForwardAction'UnrecognizedValue -> ResolveHoldForwardAction'UnrecognizedValue -> Bool #

(/=) :: ResolveHoldForwardAction'UnrecognizedValue -> ResolveHoldForwardAction'UnrecognizedValue -> Bool #

Eq RouteFeeRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: RouteFeeRequest -> RouteFeeRequest -> Bool #

(/=) :: RouteFeeRequest -> RouteFeeRequest -> Bool #

Eq RouteFeeResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: RouteFeeResponse -> RouteFeeResponse -> Bool #

(/=) :: RouteFeeResponse -> RouteFeeResponse -> Bool #

Eq SendPaymentRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: SendPaymentRequest -> SendPaymentRequest -> Bool #

(/=) :: SendPaymentRequest -> SendPaymentRequest -> Bool #

Eq SendPaymentRequest'DestCustomRecordsEntry 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: SendPaymentRequest'DestCustomRecordsEntry -> SendPaymentRequest'DestCustomRecordsEntry -> Bool #

(/=) :: SendPaymentRequest'DestCustomRecordsEntry -> SendPaymentRequest'DestCustomRecordsEntry -> Bool #

Eq SendToRouteRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: SendToRouteRequest -> SendToRouteRequest -> Bool #

(/=) :: SendToRouteRequest -> SendToRouteRequest -> Bool #

Eq SendToRouteResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: SendToRouteResponse -> SendToRouteResponse -> Bool #

(/=) :: SendToRouteResponse -> SendToRouteResponse -> Bool #

Eq SetMissionControlConfigRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: SetMissionControlConfigRequest -> SetMissionControlConfigRequest -> Bool #

(/=) :: SetMissionControlConfigRequest -> SetMissionControlConfigRequest -> Bool #

Eq SetMissionControlConfigResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: SetMissionControlConfigResponse -> SetMissionControlConfigResponse -> Bool #

(/=) :: SetMissionControlConfigResponse -> SetMissionControlConfigResponse -> Bool #

Eq SettleEvent 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: SettleEvent -> SettleEvent -> Bool #

(/=) :: SettleEvent -> SettleEvent -> Bool #

Eq SubscribeHtlcEventsRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: SubscribeHtlcEventsRequest -> SubscribeHtlcEventsRequest -> Bool #

(/=) :: SubscribeHtlcEventsRequest -> SubscribeHtlcEventsRequest -> Bool #

Eq TrackPaymentRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: TrackPaymentRequest -> TrackPaymentRequest -> Bool #

(/=) :: TrackPaymentRequest -> TrackPaymentRequest -> Bool #

Eq UpdateChanStatusRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: UpdateChanStatusRequest -> UpdateChanStatusRequest -> Bool #

(/=) :: UpdateChanStatusRequest -> UpdateChanStatusRequest -> Bool #

Eq UpdateChanStatusResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: UpdateChanStatusResponse -> UpdateChanStatusResponse -> Bool #

(/=) :: UpdateChanStatusResponse -> UpdateChanStatusResponse -> Bool #

Eq XImportMissionControlRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: XImportMissionControlRequest -> XImportMissionControlRequest -> Bool #

(/=) :: XImportMissionControlRequest -> XImportMissionControlRequest -> Bool #

Eq XImportMissionControlResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

(==) :: XImportMissionControlResponse -> XImportMissionControlResponse -> Bool #

(/=) :: XImportMissionControlResponse -> XImportMissionControlResponse -> Bool #

Eq InputScript 
Instance details

Defined in Proto.Signrpc.Signer

Methods

(==) :: InputScript -> InputScript -> Bool #

(/=) :: InputScript -> InputScript -> Bool #

Eq InputScriptResp 
Instance details

Defined in Proto.Signrpc.Signer

Methods

(==) :: InputScriptResp -> InputScriptResp -> Bool #

(/=) :: InputScriptResp -> InputScriptResp -> Bool #

Eq KeyDescriptor 
Instance details

Defined in Proto.Signrpc.Signer

Methods

(==) :: KeyDescriptor -> KeyDescriptor -> Bool #

(/=) :: KeyDescriptor -> KeyDescriptor -> Bool #

Eq KeyLocator 
Instance details

Defined in Proto.Signrpc.Signer

Methods

(==) :: KeyLocator -> KeyLocator -> Bool #

(/=) :: KeyLocator -> KeyLocator -> Bool #

Eq SharedKeyRequest 
Instance details

Defined in Proto.Signrpc.Signer

Methods

(==) :: SharedKeyRequest -> SharedKeyRequest -> Bool #

(/=) :: SharedKeyRequest -> SharedKeyRequest -> Bool #

Eq SharedKeyResponse 
Instance details

Defined in Proto.Signrpc.Signer

Methods

(==) :: SharedKeyResponse -> SharedKeyResponse -> Bool #

(/=) :: SharedKeyResponse -> SharedKeyResponse -> Bool #

Eq SignDescriptor 
Instance details

Defined in Proto.Signrpc.Signer

Methods

(==) :: SignDescriptor -> SignDescriptor -> Bool #

(/=) :: SignDescriptor -> SignDescriptor -> Bool #

Eq SignMessageReq 
Instance details

Defined in Proto.Signrpc.Signer

Methods

(==) :: SignMessageReq -> SignMessageReq -> Bool #

(/=) :: SignMessageReq -> SignMessageReq -> Bool #

Eq SignMessageResp 
Instance details

Defined in Proto.Signrpc.Signer

Methods

(==) :: SignMessageResp -> SignMessageResp -> Bool #

(/=) :: SignMessageResp -> SignMessageResp -> Bool #

Eq SignReq 
Instance details

Defined in Proto.Signrpc.Signer

Methods

(==) :: SignReq -> SignReq -> Bool #

(/=) :: SignReq -> SignReq -> Bool #

Eq SignResp 
Instance details

Defined in Proto.Signrpc.Signer

Methods

(==) :: SignResp -> SignResp -> Bool #

(/=) :: SignResp -> SignResp -> Bool #

Eq TxOut 
Instance details

Defined in Proto.Signrpc.Signer

Methods

(==) :: TxOut -> TxOut -> Bool #

(/=) :: TxOut -> TxOut -> Bool #

Eq VerifyMessageReq 
Instance details

Defined in Proto.Signrpc.Signer

Methods

(==) :: VerifyMessageReq -> VerifyMessageReq -> Bool #

(/=) :: VerifyMessageReq -> VerifyMessageReq -> Bool #

Eq VerifyMessageResp 
Instance details

Defined in Proto.Signrpc.Signer

Methods

(==) :: VerifyMessageResp -> VerifyMessageResp -> Bool #

(/=) :: VerifyMessageResp -> VerifyMessageResp -> Bool #

Eq Account 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: Account -> Account -> Bool #

(/=) :: Account -> Account -> Bool #

Eq AddrRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: AddrRequest -> AddrRequest -> Bool #

(/=) :: AddrRequest -> AddrRequest -> Bool #

Eq AddrResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: AddrResponse -> AddrResponse -> Bool #

(/=) :: AddrResponse -> AddrResponse -> Bool #

Eq AddressType 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: AddressType -> AddressType -> Bool #

(/=) :: AddressType -> AddressType -> Bool #

Eq AddressType'UnrecognizedValue 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: AddressType'UnrecognizedValue -> AddressType'UnrecognizedValue -> Bool #

(/=) :: AddressType'UnrecognizedValue -> AddressType'UnrecognizedValue -> Bool #

Eq BumpFeeRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: BumpFeeRequest -> BumpFeeRequest -> Bool #

(/=) :: BumpFeeRequest -> BumpFeeRequest -> Bool #

Eq BumpFeeResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: BumpFeeResponse -> BumpFeeResponse -> Bool #

(/=) :: BumpFeeResponse -> BumpFeeResponse -> Bool #

Eq EstimateFeeRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: EstimateFeeRequest -> EstimateFeeRequest -> Bool #

(/=) :: EstimateFeeRequest -> EstimateFeeRequest -> Bool #

Eq EstimateFeeResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: EstimateFeeResponse -> EstimateFeeResponse -> Bool #

(/=) :: EstimateFeeResponse -> EstimateFeeResponse -> Bool #

Eq FinalizePsbtRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: FinalizePsbtRequest -> FinalizePsbtRequest -> Bool #

(/=) :: FinalizePsbtRequest -> FinalizePsbtRequest -> Bool #

Eq FinalizePsbtResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: FinalizePsbtResponse -> FinalizePsbtResponse -> Bool #

(/=) :: FinalizePsbtResponse -> FinalizePsbtResponse -> Bool #

Eq FundPsbtRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: FundPsbtRequest -> FundPsbtRequest -> Bool #

(/=) :: FundPsbtRequest -> FundPsbtRequest -> Bool #

Eq FundPsbtRequest'Fees 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: FundPsbtRequest'Fees -> FundPsbtRequest'Fees -> Bool #

(/=) :: FundPsbtRequest'Fees -> FundPsbtRequest'Fees -> Bool #

Eq FundPsbtRequest'Template 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: FundPsbtRequest'Template -> FundPsbtRequest'Template -> Bool #

(/=) :: FundPsbtRequest'Template -> FundPsbtRequest'Template -> Bool #

Eq FundPsbtResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: FundPsbtResponse -> FundPsbtResponse -> Bool #

(/=) :: FundPsbtResponse -> FundPsbtResponse -> Bool #

Eq ImportAccountRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: ImportAccountRequest -> ImportAccountRequest -> Bool #

(/=) :: ImportAccountRequest -> ImportAccountRequest -> Bool #

Eq ImportAccountResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: ImportAccountResponse -> ImportAccountResponse -> Bool #

(/=) :: ImportAccountResponse -> ImportAccountResponse -> Bool #

Eq ImportPublicKeyRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: ImportPublicKeyRequest -> ImportPublicKeyRequest -> Bool #

(/=) :: ImportPublicKeyRequest -> ImportPublicKeyRequest -> Bool #

Eq ImportPublicKeyResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: ImportPublicKeyResponse -> ImportPublicKeyResponse -> Bool #

(/=) :: ImportPublicKeyResponse -> ImportPublicKeyResponse -> Bool #

Eq KeyReq 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: KeyReq -> KeyReq -> Bool #

(/=) :: KeyReq -> KeyReq -> Bool #

Eq LabelTransactionRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: LabelTransactionRequest -> LabelTransactionRequest -> Bool #

(/=) :: LabelTransactionRequest -> LabelTransactionRequest -> Bool #

Eq LabelTransactionResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: LabelTransactionResponse -> LabelTransactionResponse -> Bool #

(/=) :: LabelTransactionResponse -> LabelTransactionResponse -> Bool #

Eq LeaseOutputRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: LeaseOutputRequest -> LeaseOutputRequest -> Bool #

(/=) :: LeaseOutputRequest -> LeaseOutputRequest -> Bool #

Eq LeaseOutputResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: LeaseOutputResponse -> LeaseOutputResponse -> Bool #

(/=) :: LeaseOutputResponse -> LeaseOutputResponse -> Bool #

Eq ListAccountsRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: ListAccountsRequest -> ListAccountsRequest -> Bool #

(/=) :: ListAccountsRequest -> ListAccountsRequest -> Bool #

Eq ListAccountsResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: ListAccountsResponse -> ListAccountsResponse -> Bool #

(/=) :: ListAccountsResponse -> ListAccountsResponse -> Bool #

Eq ListLeasesRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: ListLeasesRequest -> ListLeasesRequest -> Bool #

(/=) :: ListLeasesRequest -> ListLeasesRequest -> Bool #

Eq ListLeasesResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: ListLeasesResponse -> ListLeasesResponse -> Bool #

(/=) :: ListLeasesResponse -> ListLeasesResponse -> Bool #

Eq ListSweepsRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: ListSweepsRequest -> ListSweepsRequest -> Bool #

(/=) :: ListSweepsRequest -> ListSweepsRequest -> Bool #

Eq ListSweepsResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: ListSweepsResponse -> ListSweepsResponse -> Bool #

(/=) :: ListSweepsResponse -> ListSweepsResponse -> Bool #

Eq ListSweepsResponse'Sweeps 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: ListSweepsResponse'Sweeps -> ListSweepsResponse'Sweeps -> Bool #

(/=) :: ListSweepsResponse'Sweeps -> ListSweepsResponse'Sweeps -> Bool #

Eq ListSweepsResponse'TransactionIDs 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: ListSweepsResponse'TransactionIDs -> ListSweepsResponse'TransactionIDs -> Bool #

(/=) :: ListSweepsResponse'TransactionIDs -> ListSweepsResponse'TransactionIDs -> Bool #

Eq ListUnspentRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: ListUnspentRequest -> ListUnspentRequest -> Bool #

(/=) :: ListUnspentRequest -> ListUnspentRequest -> Bool #

Eq ListUnspentResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: ListUnspentResponse -> ListUnspentResponse -> Bool #

(/=) :: ListUnspentResponse -> ListUnspentResponse -> Bool #

Eq PendingSweep 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: PendingSweep -> PendingSweep -> Bool #

(/=) :: PendingSweep -> PendingSweep -> Bool #

Eq PendingSweepsRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: PendingSweepsRequest -> PendingSweepsRequest -> Bool #

(/=) :: PendingSweepsRequest -> PendingSweepsRequest -> Bool #

Eq PendingSweepsResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: PendingSweepsResponse -> PendingSweepsResponse -> Bool #

(/=) :: PendingSweepsResponse -> PendingSweepsResponse -> Bool #

Eq PublishResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: PublishResponse -> PublishResponse -> Bool #

(/=) :: PublishResponse -> PublishResponse -> Bool #

Eq ReleaseOutputRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: ReleaseOutputRequest -> ReleaseOutputRequest -> Bool #

(/=) :: ReleaseOutputRequest -> ReleaseOutputRequest -> Bool #

Eq ReleaseOutputResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: ReleaseOutputResponse -> ReleaseOutputResponse -> Bool #

(/=) :: ReleaseOutputResponse -> ReleaseOutputResponse -> Bool #

Eq SendOutputsRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: SendOutputsRequest -> SendOutputsRequest -> Bool #

(/=) :: SendOutputsRequest -> SendOutputsRequest -> Bool #

Eq SendOutputsResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: SendOutputsResponse -> SendOutputsResponse -> Bool #

(/=) :: SendOutputsResponse -> SendOutputsResponse -> Bool #

Eq Transaction 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: Transaction -> Transaction -> Bool #

(/=) :: Transaction -> Transaction -> Bool #

Eq TxTemplate 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: TxTemplate -> TxTemplate -> Bool #

(/=) :: TxTemplate -> TxTemplate -> Bool #

Eq TxTemplate'OutputsEntry 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: TxTemplate'OutputsEntry -> TxTemplate'OutputsEntry -> Bool #

(/=) :: TxTemplate'OutputsEntry -> TxTemplate'OutputsEntry -> Bool #

Eq UtxoLease 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: UtxoLease -> UtxoLease -> Bool #

(/=) :: UtxoLease -> UtxoLease -> Bool #

Eq WitnessType 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: WitnessType -> WitnessType -> Bool #

(/=) :: WitnessType -> WitnessType -> Bool #

Eq WitnessType'UnrecognizedValue 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

(==) :: WitnessType'UnrecognizedValue -> WitnessType'UnrecognizedValue -> Bool #

(/=) :: WitnessType'UnrecognizedValue -> WitnessType'UnrecognizedValue -> Bool #

Eq ChangePasswordRequest 
Instance details

Defined in Proto.Walletunlocker

Methods

(==) :: ChangePasswordRequest -> ChangePasswordRequest -> Bool #

(/=) :: ChangePasswordRequest -> ChangePasswordRequest -> Bool #

Eq ChangePasswordResponse 
Instance details

Defined in Proto.Walletunlocker

Methods

(==) :: ChangePasswordResponse -> ChangePasswordResponse -> Bool #

(/=) :: ChangePasswordResponse -> ChangePasswordResponse -> Bool #

Eq GenSeedRequest 
Instance details

Defined in Proto.Walletunlocker

Methods

(==) :: GenSeedRequest -> GenSeedRequest -> Bool #

(/=) :: GenSeedRequest -> GenSeedRequest -> Bool #

Eq GenSeedResponse 
Instance details

Defined in Proto.Walletunlocker

Methods

(==) :: GenSeedResponse -> GenSeedResponse -> Bool #

(/=) :: GenSeedResponse -> GenSeedResponse -> Bool #

Eq InitWalletRequest 
Instance details

Defined in Proto.Walletunlocker

Methods

(==) :: InitWalletRequest -> InitWalletRequest -> Bool #

(/=) :: InitWalletRequest -> InitWalletRequest -> Bool #

Eq InitWalletResponse 
Instance details

Defined in Proto.Walletunlocker

Methods

(==) :: InitWalletResponse -> InitWalletResponse -> Bool #

(/=) :: InitWalletResponse -> InitWalletResponse -> Bool #

Eq UnlockWalletRequest 
Instance details

Defined in Proto.Walletunlocker

Methods

(==) :: UnlockWalletRequest -> UnlockWalletRequest -> Bool #

(/=) :: UnlockWalletRequest -> UnlockWalletRequest -> Bool #

Eq UnlockWalletResponse 
Instance details

Defined in Proto.Walletunlocker

Methods

(==) :: UnlockWalletResponse -> UnlockWalletResponse -> Bool #

(/=) :: UnlockWalletResponse -> UnlockWalletResponse -> Bool #

Eq WatchOnly 
Instance details

Defined in Proto.Walletunlocker

Methods

(==) :: WatchOnly -> WatchOnly -> Bool #

(/=) :: WatchOnly -> WatchOnly -> Bool #

Eq WatchOnlyAccount 
Instance details

Defined in Proto.Walletunlocker

Methods

(==) :: WatchOnlyAccount -> WatchOnlyAccount -> Bool #

(/=) :: WatchOnlyAccount -> WatchOnlyAccount -> Bool #

Eq LogLevel 
Instance details

Defined in Control.Monad.Logger

Eq AddrInfo 
Instance details

Defined in Network.Socket.Info

Eq AddrInfoFlag 
Instance details

Defined in Network.Socket.Info

Eq NameInfoFlag 
Instance details

Defined in Network.Socket.Info

Eq Family 
Instance details

Defined in Network.Socket.Types

Methods

(==) :: Family -> Family -> Bool #

(/=) :: Family -> Family -> Bool #

Eq PortNumber 
Instance details

Defined in Network.Socket.Types

Eq SockAddr 
Instance details

Defined in Network.Socket.Types

Eq Socket 
Instance details

Defined in Network.Socket.Types

Methods

(==) :: Socket -> Socket -> Bool #

(/=) :: Socket -> Socket -> Bool #

Eq SocketType 
Instance details

Defined in Network.Socket.Types

Eq Block 
Instance details

Defined in Network.Bitcoin.BlockChain

Methods

(==) :: Block -> Block -> Bool #

(/=) :: Block -> Block -> Bool #

Eq BlockChainInfo 
Instance details

Defined in Network.Bitcoin.BlockChain

Methods

(==) :: BlockChainInfo -> BlockChainInfo -> Bool #

(/=) :: BlockChainInfo -> BlockChainInfo -> Bool #

Eq BlockVerbose 
Instance details

Defined in Network.Bitcoin.BlockChain

Methods

(==) :: BlockVerbose -> BlockVerbose -> Bool #

(/=) :: BlockVerbose -> BlockVerbose -> 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 BitcoinRpcError 
Instance details

Defined in Network.Bitcoin.Internal

Methods

(==) :: BitcoinRpcError -> BitcoinRpcError -> Bool #

(/=) :: BitcoinRpcError -> BitcoinRpcError -> Bool #

Eq BlockInfo 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

(==) :: BlockInfo -> BlockInfo -> Bool #

(/=) :: BlockInfo -> BlockInfo -> Bool #

Eq DecodedPsbt 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

(==) :: DecodedPsbt -> DecodedPsbt -> Bool #

(/=) :: DecodedPsbt -> DecodedPsbt -> Bool #

Eq DecodedRawTransaction 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

(==) :: DecodedRawTransaction -> DecodedRawTransaction -> Bool #

(/=) :: DecodedRawTransaction -> DecodedRawTransaction -> Bool #

Eq RawTransactionInfo 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

(==) :: RawTransactionInfo -> RawTransactionInfo -> Bool #

(/=) :: RawTransactionInfo -> RawTransactionInfo -> Bool #

Eq ScriptPubKey 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

(==) :: ScriptPubKey -> ScriptPubKey -> Bool #

(/=) :: ScriptPubKey -> ScriptPubKey -> Bool #

Eq ScriptSig 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

(==) :: ScriptSig -> ScriptSig -> Bool #

(/=) :: ScriptSig -> ScriptSig -> Bool #

Eq TxIn 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

(==) :: TxIn -> TxIn -> Bool #

(/=) :: TxIn -> TxIn -> Bool #

Eq TxOut 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

(==) :: TxOut -> TxOut -> Bool #

(/=) :: TxOut -> TxOut -> Bool #

Eq TxnOutputType 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

(==) :: TxnOutputType -> TxnOutputType -> Bool #

(/=) :: TxnOutputType -> TxnOutputType -> Bool #

Eq UnspentTransaction 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

(==) :: UnspentTransaction -> UnspentTransaction -> Bool #

(/=) :: UnspentTransaction -> UnspentTransaction -> Bool #

Eq BitcoinException 
Instance details

Defined in Network.Bitcoin.Types

Methods

(==) :: BitcoinException -> BitcoinException -> Bool #

(/=) :: BitcoinException -> BitcoinException -> Bool #

Eq TransactionID 
Instance details

Defined in Network.Bitcoin.Types

Methods

(==) :: TransactionID -> TransactionID -> Bool #

(/=) :: TransactionID -> TransactionID -> Bool #

Eq AddrInfo 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

(==) :: AddrInfo -> AddrInfo -> Bool #

(/=) :: AddrInfo -> AddrInfo -> Bool #

Eq AddressInfo 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

(==) :: AddressInfo -> AddressInfo -> Bool #

(/=) :: AddressInfo -> AddressInfo -> Bool #

Eq BitcoindInfo 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

(==) :: BitcoindInfo -> BitcoindInfo -> Bool #

(/=) :: BitcoindInfo -> BitcoindInfo -> Bool #

Eq DetailedTransaction 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

(==) :: DetailedTransaction -> DetailedTransaction -> Bool #

(/=) :: DetailedTransaction -> DetailedTransaction -> Bool #

Eq DetailedTransactionDetails 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

(==) :: DetailedTransactionDetails -> DetailedTransactionDetails -> Bool #

(/=) :: DetailedTransactionDetails -> DetailedTransactionDetails -> Bool #

Eq EstimationMode 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

(==) :: EstimationMode -> EstimationMode -> Bool #

(/=) :: EstimationMode -> EstimationMode -> Bool #

Eq ReceivedByAccount 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

(==) :: ReceivedByAccount -> ReceivedByAccount -> Bool #

(/=) :: ReceivedByAccount -> ReceivedByAccount -> Bool #

Eq ReceivedByAddress 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

(==) :: ReceivedByAddress -> ReceivedByAddress -> Bool #

(/=) :: ReceivedByAddress -> ReceivedByAddress -> Bool #

Eq ScrPubKey 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

(==) :: ScrPubKey -> ScrPubKey -> Bool #

(/=) :: ScrPubKey -> ScrPubKey -> Bool #

Eq SimpleTransaction 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

(==) :: SimpleTransaction -> SimpleTransaction -> Bool #

(/=) :: SimpleTransaction -> SimpleTransaction -> Bool #

Eq SinceBlock 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

(==) :: SinceBlock -> SinceBlock -> Bool #

(/=) :: SinceBlock -> SinceBlock -> Bool #

Eq TransactionCategory 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

(==) :: TransactionCategory -> TransactionCategory -> Bool #

(/=) :: TransactionCategory -> TransactionCategory -> Bool #

Eq URI 
Instance details

Defined in Network.URI

Methods

(==) :: URI -> URI -> Bool #

(/=) :: URI -> URI -> Bool #

Eq URIAuth 
Instance details

Defined in Network.URI

Methods

(==) :: URIAuth -> URIAuth -> Bool #

(/=) :: URIAuth -> URIAuth -> Bool #

Eq OverflowNatural 
Instance details

Defined in Database.Persist.Class.PersistField

Eq ConstraintNameDB 
Instance details

Defined in Database.Persist.Names

Eq ConstraintNameHS 
Instance details

Defined in Database.Persist.Names

Eq EntityNameDB 
Instance details

Defined in Database.Persist.Names

Eq EntityNameHS 
Instance details

Defined in Database.Persist.Names

Eq FieldNameDB 
Instance details

Defined in Database.Persist.Names

Eq FieldNameHS 
Instance details

Defined in Database.Persist.Names

Eq LiteralType 
Instance details

Defined in Database.Persist.PersistValue

Eq PersistValue 
Instance details

Defined in Database.Persist.PersistValue

Eq ForeignFieldReference 
Instance details

Defined in Database.Persist.Quasi.Internal

Eq Line 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

(==) :: Line -> Line -> Bool #

(/=) :: Line -> Line -> Bool #

Eq LinesWithComments 
Instance details

Defined in Database.Persist.Quasi.Internal

Eq PrimarySpec 
Instance details

Defined in Database.Persist.Quasi.Internal

Eq Token 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

(==) :: Token -> Token -> Bool #

(/=) :: Token -> Token -> Bool #

Eq UnboundCompositeDef 
Instance details

Defined in Database.Persist.Quasi.Internal

Eq UnboundEntityDef 
Instance details

Defined in Database.Persist.Quasi.Internal

Eq UnboundFieldDef 
Instance details

Defined in Database.Persist.Quasi.Internal

Eq UnboundForeignDef 
Instance details

Defined in Database.Persist.Quasi.Internal

Eq UnboundForeignFieldList 
Instance details

Defined in Database.Persist.Quasi.Internal

Eq UnboundIdDef 
Instance details

Defined in Database.Persist.Quasi.Internal

Eq Column 
Instance details

Defined in Database.Persist.Sql.Types

Methods

(==) :: Column -> Column -> Bool #

(/=) :: Column -> Column -> Bool #

Eq ColumnReference 
Instance details

Defined in Database.Persist.Sql.Types

Eq IsolationLevel 
Instance details

Defined in Database.Persist.SqlBackend.Internal.IsolationLevel

Eq CascadeAction 
Instance details

Defined in Database.Persist.Types.Base

Eq Checkmark 
Instance details

Defined in Database.Persist.Types.Base

Eq CompositeDef 
Instance details

Defined in Database.Persist.Types.Base

Eq EmbedEntityDef 
Instance details

Defined in Database.Persist.Types.Base

Eq EmbedFieldDef 
Instance details

Defined in Database.Persist.Types.Base

Eq EntityDef 
Instance details

Defined in Database.Persist.Types.Base

Eq EntityIdDef 
Instance details

Defined in Database.Persist.Types.Base

Eq FieldAttr 
Instance details

Defined in Database.Persist.Types.Base

Eq FieldCascade 
Instance details

Defined in Database.Persist.Types.Base

Eq FieldDef 
Instance details

Defined in Database.Persist.Types.Base

Eq FieldType 
Instance details

Defined in Database.Persist.Types.Base

Eq ForeignDef 
Instance details

Defined in Database.Persist.Types.Base

Eq IsNullable 
Instance details

Defined in Database.Persist.Types.Base

Eq ReferenceDef 
Instance details

Defined in Database.Persist.Types.Base

Eq SelfEmbed 
Instance details

Defined in Database.Persist.Types.Base

Methods

(==) :: SelfEmbed -> SelfEmbed -> Bool #

(/=) :: SelfEmbed -> SelfEmbed -> 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

Eq WhyNullable 
Instance details

Defined in Database.Persist.Types.Base

Eq ConnectInfo 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Eq Connection 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Eq FormatError 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Eq QueryError 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Eq SqlError 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Eq Mode 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

(==) :: Mode -> Mode -> Bool #

(/=) :: Mode -> Mode -> Bool #

Eq Style 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

(==) :: Style -> Style -> Bool #

(/=) :: Style -> Style -> Bool #

Eq TextDetails 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Eq Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Methods

(==) :: Doc -> Doc -> Bool #

(/=) :: Doc -> Doc -> Bool #

Eq ColorOptions 
Instance details

Defined in Text.Pretty.Simple.Internal.Color

Eq Style 
Instance details

Defined in Text.Pretty.Simple.Internal.Color

Methods

(==) :: Style -> Style -> Bool #

(/=) :: Style -> Style -> Bool #

Eq Expr 
Instance details

Defined in Text.Pretty.Simple.Internal.Expr

Methods

(==) :: Expr -> Expr -> Bool #

(/=) :: Expr -> Expr -> Bool #

Eq CheckColorTty 
Instance details

Defined in Text.Pretty.Simple.Internal.Printer

Eq OutputOptions 
Instance details

Defined in Text.Pretty.Simple.Internal.Printer

Eq StringOutputStyle 
Instance details

Defined in Text.Pretty.Simple.Internal.Printer

Eq FusionDepth 
Instance details

Defined in Prettyprinter.Internal

Eq LayoutOptions 
Instance details

Defined in Prettyprinter.Internal

Eq PageWidth 
Instance details

Defined in Prettyprinter.Internal

Eq AnsiStyle 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Eq Bold 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

(==) :: Bold -> Bold -> Bool #

(/=) :: Bold -> Bold -> Bool #

Eq Color 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

(==) :: Color -> Color -> Bool #

(/=) :: Color -> Color -> Bool #

Eq Intensity 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Eq Italicized 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Eq Layer 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

(==) :: Layer -> Layer -> Bool #

(/=) :: Layer -> Layer -> Bool #

Eq Underlined 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Eq ByteArray

Since: primitive-0.6.3.0

Instance details

Defined in Data.Primitive.ByteArray

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 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 ErrorLevel 
Instance details

Defined in Codec.QRCode.Data.ErrorLevel

Eq StdGen 
Instance details

Defined in System.Random.Internal

Methods

(==) :: StdGen -> StdGen -> Bool #

(/=) :: StdGen -> StdGen -> Bool #

Eq ReleaseType 
Instance details

Defined in Data.Acquire.Internal

Eq Scientific

Scientific numbers can be safely compared for equality. No magnitude 10^e is calculated so there's no risk of a blowup in space or time when comparing scientific numbers coming from untrusted sources.

Instance details

Defined in Data.Scientific

Eq CompactSig 
Instance details

Defined in Crypto.Secp256k1

Eq Msg 
Instance details

Defined in Crypto.Secp256k1

Methods

(==) :: Msg -> Msg -> Bool #

(/=) :: Msg -> Msg -> Bool #

Eq PubKey 
Instance details

Defined in Crypto.Secp256k1

Methods

(==) :: PubKey -> PubKey -> Bool #

(/=) :: PubKey -> PubKey -> Bool #

Eq SecKey 
Instance details

Defined in Crypto.Secp256k1

Methods

(==) :: SecKey -> SecKey -> Bool #

(/=) :: SecKey -> SecKey -> Bool #

Eq Sig 
Instance details

Defined in Crypto.Secp256k1

Methods

(==) :: Sig -> Sig -> Bool #

(/=) :: Sig -> Sig -> Bool #

Eq Tweak 
Instance details

Defined in Crypto.Secp256k1

Methods

(==) :: Tweak -> Tweak -> Bool #

(/=) :: Tweak -> Tweak -> Bool #

Eq Binding 
Instance details

Defined in Text.Hamlet.Parse

Methods

(==) :: Binding -> Binding -> Bool #

(/=) :: Binding -> Binding -> Bool #

Eq Content 
Instance details

Defined in Text.Hamlet.Parse

Methods

(==) :: Content -> Content -> Bool #

(/=) :: Content -> Content -> Bool #

Eq DataConstr 
Instance details

Defined in Text.Hamlet.Parse

Methods

(==) :: DataConstr -> DataConstr -> Bool #

(/=) :: DataConstr -> DataConstr -> Bool #

Eq Doc 
Instance details

Defined in Text.Hamlet.Parse

Methods

(==) :: Doc -> Doc -> Bool #

(/=) :: Doc -> Doc -> Bool #

Eq Line 
Instance details

Defined in Text.Hamlet.Parse

Methods

(==) :: Line -> Line -> Bool #

(/=) :: Line -> Line -> Bool #

Eq Module 
Instance details

Defined in Text.Hamlet.Parse

Methods

(==) :: Module -> Module -> Bool #

(/=) :: Module -> Module -> Bool #

Eq Content 
Instance details

Defined in Text.Internal.Css

Methods

(==) :: Content -> Content -> Bool #

(/=) :: Content -> Content -> Bool #

Eq AbsoluteSize 
Instance details

Defined in Text.Internal.CssCommon

Eq AbsoluteUnit 
Instance details

Defined in Text.Internal.CssCommon

Eq EmSize 
Instance details

Defined in Text.Internal.CssCommon

Methods

(==) :: EmSize -> EmSize -> Bool #

(/=) :: EmSize -> EmSize -> Bool #

Eq ExSize 
Instance details

Defined in Text.Internal.CssCommon

Methods

(==) :: ExSize -> ExSize -> Bool #

(/=) :: ExSize -> ExSize -> Bool #

Eq PercentageSize 
Instance details

Defined in Text.Internal.CssCommon

Eq PixelSize 
Instance details

Defined in Text.Internal.CssCommon

Eq Content 
Instance details

Defined in Text.Shakespeare

Methods

(==) :: Content -> Content -> Bool #

(/=) :: Content -> Content -> Bool #

Eq VarType 
Instance details

Defined in Text.Shakespeare

Methods

(==) :: VarType -> VarType -> Bool #

(/=) :: VarType -> VarType -> Bool #

Eq Deref 
Instance details

Defined in Text.Shakespeare.Base

Methods

(==) :: Deref -> Deref -> Bool #

(/=) :: Deref -> Deref -> Bool #

Eq Ident 
Instance details

Defined in Text.Shakespeare.Base

Methods

(==) :: Ident -> Ident -> Bool #

(/=) :: Ident -> Ident -> Bool #

Eq HostPreference 
Instance details

Defined in Data.Streaming.Network.Internal

Eq Leniency 
Instance details

Defined in Data.String.Conv

Eq AnnLookup 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq AnnTarget 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Bang 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Bang -> Bang -> Bool #

(/=) :: Bang -> Bang -> Bool #

Eq Body 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Body -> Body -> Bool #

(/=) :: Body -> Body -> Bool #

Eq Bytes 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Bytes -> Bytes -> Bool #

(/=) :: Bytes -> Bytes -> Bool #

Eq Callconv 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Clause 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Clause -> Clause -> Bool #

(/=) :: Clause -> Clause -> Bool #

Eq Con 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Con -> Con -> Bool #

(/=) :: Con -> Con -> Bool #

Eq Dec 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Dec -> Dec -> Bool #

(/=) :: Dec -> Dec -> Bool #

Eq DecidedStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq DerivClause 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq DerivStrategy 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Exp 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Exp -> Exp -> Bool #

(/=) :: Exp -> Exp -> Bool #

Eq FamilyResultSig 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Fixity 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Fixity -> Fixity -> Bool #

(/=) :: Fixity -> Fixity -> Bool #

Eq FixityDirection 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Foreign 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Foreign -> Foreign -> Bool #

(/=) :: Foreign -> Foreign -> Bool #

Eq FunDep 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: FunDep -> FunDep -> Bool #

(/=) :: FunDep -> FunDep -> Bool #

Eq Guard 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Guard -> Guard -> Bool #

(/=) :: Guard -> Guard -> Bool #

Eq Info 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Info -> Info -> Bool #

(/=) :: Info -> Info -> Bool #

Eq InjectivityAnn 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Inline 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Inline -> Inline -> Bool #

(/=) :: Inline -> Inline -> Bool #

Eq Lit 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Lit -> Lit -> Bool #

(/=) :: Lit -> Lit -> Bool #

Eq Loc 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Loc -> Loc -> Bool #

(/=) :: Loc -> Loc -> Bool #

Eq Match 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Match -> Match -> Bool #

(/=) :: Match -> Match -> Bool #

Eq ModName 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: ModName -> ModName -> Bool #

(/=) :: ModName -> ModName -> Bool #

Eq Module 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Module -> Module -> Bool #

(/=) :: Module -> Module -> Bool #

Eq ModuleInfo 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Name 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Name -> Name -> Bool #

(/=) :: Name -> Name -> Bool #

Eq NameFlavour 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq NameSpace 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq OccName 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: OccName -> OccName -> Bool #

(/=) :: OccName -> OccName -> Bool #

Eq Overlap 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Overlap -> Overlap -> Bool #

(/=) :: Overlap -> Overlap -> Bool #

Eq Pat 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Pat -> Pat -> Bool #

(/=) :: Pat -> Pat -> Bool #

Eq PatSynArgs 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq PatSynDir 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Phases 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Phases -> Phases -> Bool #

(/=) :: Phases -> Phases -> Bool #

Eq PkgName 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: PkgName -> PkgName -> Bool #

(/=) :: PkgName -> PkgName -> Bool #

Eq Pragma 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Pragma -> Pragma -> Bool #

(/=) :: Pragma -> Pragma -> Bool #

Eq Range 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Range -> Range -> Bool #

(/=) :: Range -> Range -> Bool #

Eq Role 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Role -> Role -> Bool #

(/=) :: Role -> Role -> Bool #

Eq RuleBndr 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq RuleMatch 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Safety 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Safety -> Safety -> Bool #

(/=) :: Safety -> Safety -> Bool #

Eq SourceStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq SourceUnpackedness 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Specificity 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Stmt 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Stmt -> Stmt -> Bool #

(/=) :: Stmt -> Stmt -> Bool #

Eq TyLit 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: TyLit -> TyLit -> Bool #

(/=) :: TyLit -> TyLit -> Bool #

Eq TySynEqn 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Type 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Type -> Type -> Bool #

(/=) :: Type -> Type -> Bool #

Eq TypeFamilyHead 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq CodePoint 
Instance details

Defined in Data.Text.Encoding

Methods

(==) :: CodePoint -> CodePoint -> Bool #

(/=) :: CodePoint -> CodePoint -> Bool #

Eq DecoderState 
Instance details

Defined in Data.Text.Encoding

Methods

(==) :: DecoderState -> DecoderState -> Bool #

(/=) :: DecoderState -> DecoderState -> Bool #

Eq UnicodeException 
Instance details

Defined in Data.Text.Encoding.Error

Eq Builder 
Instance details

Defined in Data.Text.Internal.Builder

Methods

(==) :: Builder -> Builder -> Bool #

(/=) :: Builder -> Builder -> Bool #

Eq B 
Instance details

Defined in Data.Text.Short.Internal

Methods

(==) :: B -> B -> Bool #

(/=) :: B -> B -> Bool #

Eq ShortText 
Instance details

Defined in Data.Text.Short.Internal

Eq ConstructorInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Eq ConstructorVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Eq DatatypeInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Eq DatatypeVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Eq FieldStrictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Eq Strictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Eq Unpackedness 
Instance details

Defined in Language.Haskell.TH.Datatype

Eq Day 
Instance details

Defined in Data.Time.Calendar.Days

Methods

(==) :: Day -> Day -> Bool #

(/=) :: Day -> Day -> Bool #

Eq DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Eq NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Eq UTCTime 
Instance details

Defined in Data.Time.Clock.Internal.UTCTime

Methods

(==) :: UTCTime -> UTCTime -> Bool #

(/=) :: UTCTime -> UTCTime -> Bool #

Eq TimeLocale 
Instance details

Defined in Data.Time.Format.Locale

Eq LocalTime 
Instance details

Defined in Data.Time.LocalTime.Internal.LocalTime

Eq TimeOfDay 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeOfDay

Eq EMSMode 
Instance details

Defined in Network.TLS.Parameters

Methods

(==) :: EMSMode -> EMSMode -> Bool #

(/=) :: EMSMode -> EMSMode -> Bool #

Eq GroupUsage 
Instance details

Defined in Network.TLS.Parameters

Eq Supported 
Instance details

Defined in Network.TLS.Parameters

Eq Undefined 
Instance details

Defined in Universum.Debug

Eq StringException

Since: unliftio-0.2.19

Instance details

Defined in UnliftIO.Exception

Eq ConcException 
Instance details

Defined in UnliftIO.Internals.Async

Eq UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

(==) :: UUID -> UUID -> Bool #

(/=) :: UUID -> UUID -> Bool #

Eq UnpackedUUID 
Instance details

Defined in Data.UUID.Types.Internal

Eq Piece 
Instance details

Defined in WaiAppStatic.Types

Methods

(==) :: Piece -> Piece -> Bool #

(/=) :: Piece -> Piece -> Bool #

Eq Bound 
Instance details

Defined in Network.Wai.Parse

Methods

(==) :: Bound -> Bound -> Bool #

(/=) :: Bound -> Bound -> Bool #

Eq FileInfo 
Instance details

Defined in Network.Wai.Handler.Warp.FileInfoCache

Eq PushPromise 
Instance details

Defined in Network.Wai.Handler.Warp.HTTP2.Types

Eq InvalidRequest 
Instance details

Defined in Network.Wai.Handler.Warp.Types

Eq Int128 
Instance details

Defined in Data.WideWord.Int128

Methods

(==) :: Int128 -> Int128 -> Bool #

(/=) :: Int128 -> Int128 -> Bool #

Eq Word128 
Instance details

Defined in Data.WideWord.Word128

Methods

(==) :: Word128 -> Word128 -> Bool #

(/=) :: Word128 -> Word128 -> Bool #

Eq Word256 
Instance details

Defined in Data.WideWord.Word256

Methods

(==) :: Word256 -> Word256 -> Bool #

(/=) :: Word256 -> Word256 -> Bool #

Eq Content 
Instance details

Defined in Data.XML.Types

Methods

(==) :: Content -> Content -> Bool #

(/=) :: Content -> Content -> Bool #

Eq Doctype 
Instance details

Defined in Data.XML.Types

Methods

(==) :: Doctype -> Doctype -> Bool #

(/=) :: Doctype -> Doctype -> Bool #

Eq Document 
Instance details

Defined in Data.XML.Types

Eq Element 
Instance details

Defined in Data.XML.Types

Methods

(==) :: Element -> Element -> Bool #

(/=) :: Element -> Element -> Bool #

Eq Event 
Instance details

Defined in Data.XML.Types

Methods

(==) :: Event -> Event -> Bool #

(/=) :: Event -> Event -> Bool #

Eq ExternalID 
Instance details

Defined in Data.XML.Types

Eq Instruction 
Instance details

Defined in Data.XML.Types

Eq Miscellaneous 
Instance details

Defined in Data.XML.Types

Eq Name 
Instance details

Defined in Data.XML.Types

Methods

(==) :: Name -> Name -> Bool #

(/=) :: Name -> Name -> Bool #

Eq Node 
Instance details

Defined in Data.XML.Types

Methods

(==) :: Node -> Node -> Bool #

(/=) :: Node -> Node -> Bool #

Eq Prologue 
Instance details

Defined in Data.XML.Types

Eq Warning 
Instance details

Defined in Data.Yaml.Internal

Methods

(==) :: Warning -> Warning -> Bool #

(/=) :: Warning -> Warning -> Bool #

Eq Etag 
Instance details

Defined in Yesod.Core.Handler

Methods

(==) :: Etag -> Etag -> Bool #

(/=) :: Etag -> Etag -> Bool #

Eq AuthResult 
Instance details

Defined in Yesod.Core.Types

Eq ClientSessionDateCache 
Instance details

Defined in Yesod.Core.Types

Eq ErrorResponse 
Instance details

Defined in Yesod.Core.Types

Eq Header 
Instance details

Defined in Yesod.Core.Types

Methods

(==) :: Header -> Header -> Bool #

(/=) :: Header -> Header -> Bool #

Eq TypeTree 
Instance details

Defined in Yesod.Routes.Parse

Methods

(==) :: TypeTree -> TypeTree -> Bool #

(/=) :: TypeTree -> TypeTree -> Bool #

Eq BootstrapGridOptions 
Instance details

Defined in Yesod.Form.Bootstrap3

Eq Textarea 
Instance details

Defined in Yesod.Form.Fields

Eq Enctype 
Instance details

Defined in Yesod.Form.Types

Methods

(==) :: Enctype -> Enctype -> Bool #

(/=) :: Enctype -> Enctype -> Bool #

Eq FormMessage 
Instance details

Defined in Yesod.Form.Types

Eq CompressionLevel 
Instance details

Defined in Codec.Compression.Zlib.Stream

Eq CompressionStrategy 
Instance details

Defined in Codec.Compression.Zlib.Stream

Eq DictionaryHash 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

(==) :: DictionaryHash -> DictionaryHash -> Bool #

(/=) :: DictionaryHash -> DictionaryHash -> Bool #

Eq Format 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

(==) :: Format -> Format -> Bool #

(/=) :: Format -> Format -> Bool #

Eq MemoryLevel 
Instance details

Defined in Codec.Compression.Zlib.Stream

Eq Method 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

(==) :: Method -> Method -> Bool #

(/=) :: Method -> Method -> Bool #

Eq WindowBits 
Instance details

Defined in Codec.Compression.Zlib.Stream

Eq Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Methods

(==) :: Word8 -> Word8 -> Bool #

(/=) :: Word8 -> Word8 -> Bool #

Eq Integer 
Instance details

Defined in GHC.Num.Integer

Methods

(==) :: Integer -> Integer -> Bool #

(/=) :: Integer -> Integer -> Bool #

Eq Natural 
Instance details

Defined in GHC.Num.Natural

Methods

(==) :: Natural -> Natural -> Bool #

(/=) :: Natural -> Natural -> Bool #

Eq () 
Instance details

Defined in GHC.Classes

Methods

(==) :: () -> () -> Bool #

(/=) :: () -> () -> Bool #

Eq Bool 
Instance details

Defined in GHC.Classes

Methods

(==) :: Bool -> Bool -> Bool #

(/=) :: Bool -> Bool -> Bool #

Eq Char 
Instance details

Defined in GHC.Classes

Methods

(==) :: Char -> Char -> Bool #

(/=) :: Char -> Char -> Bool #

Eq Double

Note that due to the presence of NaN, Double's Eq instance does not satisfy reflexivity.

>>> 0/0 == (0/0 :: Double)
False

Also note that Double's Eq instance does not satisfy substitutivity:

>>> 0 == (-0 :: Double)
True
>>> recip 0 == recip (-0 :: Double)
False
Instance details

Defined in GHC.Classes

Methods

(==) :: Double -> Double -> Bool #

(/=) :: Double -> Double -> Bool #

Eq Float

Note that due to the presence of NaN, Float's Eq instance does not satisfy reflexivity.

>>> 0/0 == (0/0 :: Float)
False

Also note that Float's Eq instance does not satisfy 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 Word 
Instance details

Defined in GHC.Classes

Methods

(==) :: Word -> Word -> Bool #

(/=) :: Word -> Word -> 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 (Only a) 
Instance details

Defined in Data.Tuple.Only

Methods

(==) :: Only a -> Only a -> Bool #

(/=) :: Only a -> Only a -> Bool #

Eq (Digest t) 
Instance details

Defined in Data.Digest.Pure.SHA

Methods

(==) :: Digest t -> Digest t -> Bool #

(/=) :: Digest t -> Digest t -> Bool #

Eq (Encoding' a) 
Instance details

Defined in Data.Aeson.Encoding.Internal

Methods

(==) :: Encoding' a -> Encoding' a -> Bool #

(/=) :: Encoding' a -> Encoding' 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 a => Eq (Result a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

(==) :: Result a -> Result a -> Bool #

(/=) :: Result a -> Result a -> Bool #

Eq (Async a) 
Instance details

Defined in Control.Concurrent.Async

Methods

(==) :: Async a -> Async a -> Bool #

(/=) :: Async a -> Async a -> Bool #

Eq a => Eq (ZipList a)

Since: base-4.7.0.0

Instance details

Defined in Control.Applicative

Methods

(==) :: ZipList a -> ZipList a -> Bool #

(/=) :: ZipList a -> ZipList a -> Bool #

Eq (Chan a)

Since: base-4.4.0.0

Instance details

Defined in Control.Concurrent.Chan

Methods

(==) :: Chan a -> Chan a -> Bool #

(/=) :: Chan a -> Chan a -> Bool #

Eq a => Eq (Complex a)

Since: base-2.1

Instance details

Defined in Data.Complex

Methods

(==) :: Complex a -> Complex a -> Bool #

(/=) :: Complex a -> Complex a -> Bool #

Eq a => Eq (Identity a)

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

(==) :: Identity a -> Identity a -> Bool #

(/=) :: Identity a -> Identity a -> Bool #

Eq a => Eq (First a)

Since: base-2.1

Instance details

Defined in Data.Monoid

Methods

(==) :: First a -> First a -> Bool #

(/=) :: First a -> First a -> Bool #

Eq a => Eq (Last a)

Since: base-2.1

Instance details

Defined in Data.Monoid

Methods

(==) :: Last a -> Last a -> Bool #

(/=) :: Last a -> Last a -> Bool #

Eq a => Eq (Down a)

Since: base-4.6.0.0

Instance details

Defined in Data.Ord

Methods

(==) :: Down a -> Down a -> Bool #

(/=) :: Down a -> Down a -> Bool #

Eq a => Eq (First a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(==) :: First a -> First a -> Bool #

(/=) :: First a -> First a -> Bool #

Eq a => Eq (Last a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(==) :: Last a -> Last a -> Bool #

(/=) :: Last a -> Last a -> Bool #

Eq a => Eq (Max a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(==) :: Max a -> Max a -> Bool #

(/=) :: Max a -> Max a -> Bool #

Eq a => Eq (Min a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(==) :: Min a -> Min a -> Bool #

(/=) :: Min a -> Min a -> Bool #

Eq 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 m => Eq (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Eq a => Eq (Dual a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

(==) :: Dual a -> Dual a -> Bool #

(/=) :: Dual a -> Dual a -> Bool #

Eq a => Eq (Product a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

(==) :: Product a -> Product a -> Bool #

(/=) :: Product a -> Product a -> Bool #

Eq a => Eq (Sum a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

(==) :: Sum a -> Sum a -> Bool #

(/=) :: Sum a -> Sum a -> Bool #

Eq 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 (TVar a)

Since: base-4.8.0.0

Instance details

Defined in GHC.Conc.Sync

Methods

(==) :: TVar a -> TVar a -> Bool #

(/=) :: TVar a -> TVar a -> Bool #

Eq (ForeignPtr a)

Since: base-2.1

Instance details

Defined in GHC.ForeignPtr

Methods

(==) :: ForeignPtr a -> ForeignPtr a -> Bool #

(/=) :: ForeignPtr a -> ForeignPtr a -> Bool #

Eq p => Eq (Par1 p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: Par1 p -> Par1 p -> Bool #

(/=) :: Par1 p -> Par1 p -> Bool #

Eq (IORef a)

Pointer equality.

Since: base-4.0.0.0

Instance details

Defined in GHC.IORef

Methods

(==) :: IORef a -> IORef a -> Bool #

(/=) :: IORef a -> IORef a -> Bool #

Eq (MVar a)

Since: base-4.1.0.0

Instance details

Defined in GHC.MVar

Methods

(==) :: MVar a -> MVar a -> Bool #

(/=) :: MVar a -> MVar a -> Bool #

Eq (FunPtr a) 
Instance details

Defined in GHC.Ptr

Methods

(==) :: FunPtr a -> FunPtr a -> Bool #

(/=) :: FunPtr a -> FunPtr a -> Bool #

Eq (Ptr a)

Since: base-2.1

Instance details

Defined in GHC.Ptr

Methods

(==) :: Ptr a -> Ptr a -> Bool #

(/=) :: Ptr a -> Ptr a -> Bool #

Eq a => Eq (Ratio a)

Since: base-2.1

Instance details

Defined in GHC.Real

Methods

(==) :: Ratio a -> Ratio a -> Bool #

(/=) :: Ratio a -> Ratio a -> Bool #

Eq (Bits n) 
Instance details

Defined in Basement.Bits

Methods

(==) :: Bits n -> Bits n -> Bool #

(/=) :: Bits n -> Bits n -> Bool #

(PrimType ty, Eq ty) => Eq (Block ty) 
Instance details

Defined in Basement.Block.Base

Methods

(==) :: Block ty -> Block ty -> Bool #

(/=) :: Block ty -> Block ty -> Bool #

Eq (Zn n) 
Instance details

Defined in Basement.Bounded

Methods

(==) :: Zn n -> Zn n -> Bool #

(/=) :: Zn n -> Zn n -> Bool #

Eq (Zn64 n) 
Instance details

Defined in Basement.Bounded

Methods

(==) :: Zn64 n -> Zn64 n -> Bool #

(/=) :: Zn64 n -> Zn64 n -> Bool #

Eq a => Eq (NonEmpty a) 
Instance details

Defined in Basement.NonEmpty

Methods

(==) :: NonEmpty a -> NonEmpty a -> Bool #

(/=) :: NonEmpty a -> NonEmpty a -> Bool #

Eq (CountOf ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

(==) :: CountOf ty -> CountOf ty -> Bool #

(/=) :: CountOf ty -> CountOf ty -> Bool #

Eq (Offset ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

(==) :: Offset ty -> Offset ty -> Bool #

(/=) :: Offset ty -> Offset ty -> Bool #

(PrimType ty, Eq ty) => Eq (UArray ty) 
Instance details

Defined in Basement.UArray.Base

Methods

(==) :: UArray ty -> UArray ty -> Bool #

(/=) :: UArray ty -> UArray ty -> Bool #

Eq (OnChainAddress mrel) Source # 
Instance details

Defined in BtcLsp.Data.Smart

Methods

(==) :: OnChainAddress mrel -> OnChainAddress mrel -> Bool #

(/=) :: OnChainAddress mrel -> OnChainAddress mrel -> Bool #

Eq (Liquidity dir) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

(==) :: Liquidity dir -> Liquidity dir -> Bool #

(/=) :: Liquidity dir -> Liquidity dir -> Bool #

Eq (LnInvoice mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

(==) :: LnInvoice mrel -> LnInvoice mrel -> Bool #

(/=) :: LnInvoice mrel -> LnInvoice mrel -> Bool #

Eq (UnsafeOnChainAddress mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Eq (Uuid tab) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

(==) :: Uuid tab -> Uuid tab -> Bool #

(/=) :: Uuid tab -> Uuid tab -> Bool #

Eq (TlsCert rel) Source # 
Instance details

Defined in BtcLsp.Grpc.Data

Methods

(==) :: TlsCert rel -> TlsCert rel -> Bool #

(/=) :: TlsCert rel -> TlsCert rel -> Bool #

Eq (TlsData rel) Source # 
Instance details

Defined in BtcLsp.Grpc.Data

Methods

(==) :: TlsData rel -> TlsData rel -> Bool #

(/=) :: TlsData rel -> TlsData rel -> Bool #

Eq (TlsKey rel) Source # 
Instance details

Defined in BtcLsp.Grpc.Data

Methods

(==) :: TlsKey rel -> TlsKey rel -> Bool #

(/=) :: TlsKey rel -> TlsKey rel -> 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 (Identifier a) 
Instance details

Defined in Text.Casing

Methods

(==) :: Identifier a -> Identifier a -> Bool #

(/=) :: Identifier a -> Identifier a -> Bool #

Eq a => Eq (MeridiemLocale a) 
Instance details

Defined in Chronos

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 (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

(==) :: IntMap a -> IntMap a -> Bool #

(/=) :: IntMap a -> IntMap a -> Bool #

Eq a => Eq (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

(==) :: Seq a -> Seq a -> Bool #

(/=) :: Seq a -> Seq a -> Bool #

Eq a => Eq (ViewL a) 
Instance details

Defined in Data.Sequence.Internal

Methods

(==) :: ViewL a -> ViewL a -> Bool #

(/=) :: ViewL a -> ViewL a -> Bool #

Eq a => Eq (ViewR a) 
Instance details

Defined in Data.Sequence.Internal

Methods

(==) :: ViewR a -> ViewR a -> Bool #

(/=) :: ViewR a -> ViewR a -> Bool #

Eq a => Eq (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

(==) :: Set a -> Set a -> Bool #

(/=) :: Set a -> Set a -> Bool #

Eq a => Eq (Tree a) 
Instance details

Defined in Data.Tree

Methods

(==) :: Tree a -> Tree a -> Bool #

(/=) :: Tree a -> Tree a -> Bool #

Eq a => Eq (CryptoFailable a) 
Instance details

Defined in Crypto.Error.Types

Eq (Digest a) 
Instance details

Defined in Crypto.Hash.Types

Methods

(==) :: Digest a -> Digest a -> Bool #

(/=) :: Digest a -> Digest a -> Bool #

Eq1 f => Eq (Fix f) 
Instance details

Defined in Data.Fix

Methods

(==) :: Fix f -> Fix f -> Bool #

(/=) :: Fix f -> Fix f -> Bool #

(Functor f, Eq1 f) => Eq (Mu f) 
Instance details

Defined in Data.Fix

Methods

(==) :: Mu f -> Mu f -> Bool #

(/=) :: Mu f -> Mu f -> Bool #

(Functor f, Eq1 f) => Eq (Nu f) 
Instance details

Defined in Data.Fix

Methods

(==) :: Nu f -> Nu f -> Bool #

(/=) :: Nu f -> Nu f -> Bool #

Eq a => Eq (DNonEmpty a) 
Instance details

Defined in Data.DList.DNonEmpty.Internal

Methods

(==) :: DNonEmpty a -> DNonEmpty a -> Bool #

(/=) :: DNonEmpty a -> DNonEmpty a -> Bool #

Eq a => Eq (DList a) 
Instance details

Defined in Data.DList.Internal

Methods

(==) :: DList a -> DList a -> Bool #

(/=) :: DList a -> DList a -> Bool #

Eq a => Eq (Value a) 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Methods

(==) :: Value a -> Value a -> Bool #

(/=) :: Value a -> Value a -> Bool #

Eq a => Eq (ValueList a) 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Methods

(==) :: ValueList a -> ValueList a -> Bool #

(/=) :: ValueList a -> ValueList a -> Bool #

Eq a => Eq (FromListCounting a) 
Instance details

Defined in Data.Graph.Inductive.PatriciaTree

Methods

(==) :: FromListCounting a -> FromListCounting a -> Bool #

(/=) :: FromListCounting a -> FromListCounting a -> Bool #

Eq a => Eq (PrettyLog a) 
Instance details

Defined in Text.PrettyPrint.GenericPretty.Type

Methods

(==) :: PrettyLog a -> PrettyLog a -> Bool #

(/=) :: PrettyLog a -> PrettyLog a -> Bool #

Eq a => Eq (Hashed a)

Uses precomputed hash to detect inequality faster

Instance details

Defined in Data.Hashable.Class

Methods

(==) :: Hashed a -> Hashed a -> Bool #

(/=) :: Hashed a -> Hashed a -> Bool #

Eq a => Eq (LenientData a) 
Instance details

Defined in Web.Internal.HttpApiData

Eq a => Eq (AddrRange a) 
Instance details

Defined in Data.IP.Range

Methods

(==) :: AddrRange a -> AddrRange a -> Bool #

(/=) :: AddrRange a -> AddrRange a -> Bool #

Eq a => Eq (Item a) 
Instance details

Defined in Katip.Core

Methods

(==) :: Item a -> Item a -> Bool #

(/=) :: Item a -> Item a -> Bool #

Eq (PendingUpdate a) 
Instance details

Defined in LndClient.Data.Channel

Methods

(==) :: PendingUpdate a -> PendingUpdate a -> Bool #

(/=) :: PendingUpdate a -> PendingUpdate a -> Bool #

Eq (TxId a) 
Instance details

Defined in LndClient.Data.Newtype

Methods

(==) :: TxId a -> TxId a -> Bool #

(/=) :: TxId a -> TxId a -> Bool #

Eq (Vout a) 
Instance details

Defined in LndClient.Data.Newtype

Methods

(==) :: Vout a -> Vout a -> Bool #

(/=) :: Vout a -> Vout a -> Bool #

Eq mono => Eq (NonNull mono) 
Instance details

Defined in Data.NonNull

Methods

(==) :: NonNull mono -> NonNull mono -> Bool #

(/=) :: NonNull mono -> NonNull mono -> Bool #

Eq a => Eq (BitcoinRpcResponse a) 
Instance details

Defined in Network.Bitcoin.Internal

Methods

(==) :: BitcoinRpcResponse a -> BitcoinRpcResponse a -> Bool #

(/=) :: BitcoinRpcResponse a -> BitcoinRpcResponse 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 (Key Block) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Methods

(==) :: Key Block -> Key Block -> Bool #

(/=) :: Key Block -> Key Block -> Bool #

Eq (Key LnChan) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Methods

(==) :: Key LnChan -> Key LnChan -> Bool #

(/=) :: Key LnChan -> Key LnChan -> Bool #

Eq (Key SwapIntoLn) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Eq (Key SwapUtxo) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Eq (Key User) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Methods

(==) :: Key User -> Key User -> Bool #

(/=) :: Key User -> Key User -> Bool #

(BackendCompatible b s, Eq (BackendKey b)) => Eq (BackendKey (Compatible b s)) 
Instance details

Defined in Database.Persist.Compatible.Types

(PersistCore b, PersistCore (RawPostgresql b), Eq (BackendKey b)) => Eq (BackendKey (RawPostgresql b)) 
Instance details

Defined in Database.Persist.Postgresql

Eq a => Eq (Single a) 
Instance details

Defined in Database.Persist.Sql.Types

Methods

(==) :: Single a -> Single a -> Bool #

(/=) :: Single a -> Single a -> Bool #

Eq a => Eq (AnnotDetails a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Eq (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

(==) :: Doc a -> Doc a -> Bool #

(/=) :: Doc a -> Doc a -> Bool #

Eq a => Eq (Span a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

(==) :: Span a -> Span a -> Bool #

(/=) :: Span a -> Span a -> Bool #

Eq a => Eq (CommaSeparated a) 
Instance details

Defined in Text.Pretty.Simple.Internal.Expr

Eq ann => Eq (SimpleDocStream ann) 
Instance details

Defined in Prettyprinter.Internal

Eq a => Eq (Array a) 
Instance details

Defined in Data.Primitive.Array

Methods

(==) :: Array a -> Array a -> Bool #

(/=) :: Array a -> Array a -> Bool #

Eq (MutableByteArray s) 
Instance details

Defined in Data.Primitive.ByteArray

(Eq a, Prim a) => Eq (PrimArray a)

Since: primitive-0.6.4.0

Instance details

Defined in Data.Primitive.PrimArray

Methods

(==) :: PrimArray a -> PrimArray a -> Bool #

(/=) :: PrimArray a -> PrimArray a -> Bool #

Eq a => Eq (SmallArray a) 
Instance details

Defined in Data.Primitive.SmallArray

Methods

(==) :: SmallArray a -> SmallArray a -> Bool #

(/=) :: SmallArray a -> SmallArray a -> Bool #

(Eq a, PrimUnlifted a) => Eq (UnliftedArray a) 
Instance details

Defined in Data.Primitive.Unlifted.Array

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 g => Eq (StateGen g) 
Instance details

Defined in System.Random.Internal

Methods

(==) :: StateGen g -> StateGen g -> Bool #

(/=) :: StateGen g -> StateGen g -> Bool #

Eq g => Eq (AtomicGen g) 
Instance details

Defined in System.Random.Stateful

Methods

(==) :: AtomicGen g -> AtomicGen g -> Bool #

(/=) :: AtomicGen g -> AtomicGen g -> Bool #

Eq g => Eq (IOGen g) 
Instance details

Defined in System.Random.Stateful

Methods

(==) :: IOGen g -> IOGen g -> Bool #

(/=) :: IOGen g -> IOGen g -> Bool #

Eq g => Eq (STGen g) 
Instance details

Defined in System.Random.Stateful

Methods

(==) :: STGen g -> STGen g -> Bool #

(/=) :: STGen g -> STGen g -> Bool #

Eq g => Eq (TGen g) 
Instance details

Defined in System.Random.Stateful

Methods

(==) :: TGen g -> TGen g -> Bool #

(/=) :: TGen g -> TGen g -> Bool #

Eq v => Eq (Result v) 
Instance details

Defined in Text.Hamlet.Parse

Methods

(==) :: Result v -> Result v -> Bool #

(/=) :: Result v -> Result v -> Bool #

Eq (TBQueue a) 
Instance details

Defined in Control.Concurrent.STM.TBQueue

Methods

(==) :: TBQueue a -> TBQueue a -> Bool #

(/=) :: TBQueue a -> TBQueue a -> Bool #

Eq (TChan a) 
Instance details

Defined in Control.Concurrent.STM.TChan

Methods

(==) :: TChan a -> TChan a -> Bool #

(/=) :: TChan a -> TChan a -> Bool #

Eq (TMVar a) 
Instance details

Defined in Control.Concurrent.STM.TMVar

Methods

(==) :: TMVar a -> TMVar a -> Bool #

(/=) :: TMVar a -> TMVar a -> Bool #

Eq (TQueue a) 
Instance details

Defined in Control.Concurrent.STM.TQueue

Methods

(==) :: TQueue a -> TQueue a -> Bool #

(/=) :: TQueue a -> TQueue a -> Bool #

Eq a => Eq (Maybe a) 
Instance details

Defined in Data.Strict.Maybe

Methods

(==) :: Maybe a -> Maybe a -> Bool #

(/=) :: Maybe a -> Maybe a -> Bool #

Eq flag => Eq (TyVarBndr flag) 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: TyVarBndr flag -> TyVarBndr flag -> Bool #

(/=) :: TyVarBndr flag -> TyVarBndr flag -> Bool #

Eq a => Eq (HashSet a)

Note that, in the presence of hash collisions, equal HashSets may behave differently, i.e. substitutivity may be violated:

>>> data D = A | B deriving (Eq, Show)
>>> instance Hashable D where hashWithSalt salt _d = salt
>>> x = fromList [A, B]
>>> y = fromList [B, A]
>>> x == y
True
>>> toList x
[A,B]
>>> toList y
[B,A]

In general, the lack of substitutivity can be observed with any function that depends on the key ordering, such as folds and traversals.

Instance details

Defined in Data.HashSet.Internal

Methods

(==) :: HashSet a -> HashSet a -> Bool #

(/=) :: HashSet a -> HashSet a -> Bool #

Eq a => Eq (Vector a) 
Instance details

Defined in Data.Vector

Methods

(==) :: Vector a -> Vector a -> Bool #

(/=) :: Vector a -> Vector a -> Bool #

(Prim a, Eq a) => Eq (Vector a) 
Instance details

Defined in Data.Vector.Primitive

Methods

(==) :: Vector a -> Vector a -> Bool #

(/=) :: Vector a -> Vector a -> Bool #

(Storable a, Eq a) => Eq (Vector a) 
Instance details

Defined in Data.Vector.Storable

Methods

(==) :: Vector a -> Vector a -> Bool #

(/=) :: Vector a -> Vector a -> Bool #

Eq c => Eq (FileInfo c) 
Instance details

Defined in Network.Wai.Parse

Methods

(==) :: FileInfo c -> FileInfo c -> Bool #

(/=) :: FileInfo c -> FileInfo c -> Bool #

Eq url => Eq (Location url) 
Instance details

Defined in Yesod.Core.Types

Methods

(==) :: Location url -> Location url -> Bool #

(/=) :: Location url -> Location url -> Bool #

Eq url => Eq (Script url) 
Instance details

Defined in Yesod.Core.Types

Methods

(==) :: Script url -> Script url -> Bool #

(/=) :: Script url -> Script url -> Bool #

Eq url => Eq (Stylesheet url) 
Instance details

Defined in Yesod.Core.Types

Methods

(==) :: Stylesheet url -> Stylesheet url -> Bool #

(/=) :: Stylesheet url -> Stylesheet url -> Bool #

Eq (Route App) Source # 
Instance details

Defined in BtcLsp.Yesod.Foundation

Methods

(==) :: Route App -> Route App -> Bool #

(/=) :: Route App -> Route App -> Bool #

Eq (Route Auth) 
Instance details

Defined in Yesod.Auth.Routes

Methods

(==) :: Route Auth -> Route Auth -> Bool #

(/=) :: Route Auth -> Route Auth -> Bool #

Eq (Route LiteApp) 
Instance details

Defined in Yesod.Core.Internal.LiteApp

Eq (Route WaiSubsite) 
Instance details

Defined in Yesod.Core.Types

Eq (Route WaiSubsiteWithAuth) 
Instance details

Defined in Yesod.Core.Types

Eq (Route Static) 
Instance details

Defined in Yesod.Static

Eq a => Eq (FormResult a) 
Instance details

Defined in Yesod.Form.Types

Methods

(==) :: FormResult a -> FormResult a -> Bool #

(/=) :: FormResult a -> FormResult a -> Bool #

Eq a => Eq (Maybe a)

Since: base-2.1

Instance details

Defined in GHC.Maybe

Methods

(==) :: Maybe a -> Maybe a -> Bool #

(/=) :: Maybe a -> Maybe a -> Bool #

Eq a => Eq [a] 
Instance details

Defined in GHC.Classes

Methods

(==) :: [a] -> [a] -> Bool #

(/=) :: [a] -> [a] -> Bool #

(Eq a, Eq 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 (Fixed a)

Since: base-2.1

Instance details

Defined in Data.Fixed

Methods

(==) :: Fixed a -> Fixed a -> Bool #

(/=) :: Fixed a -> Fixed a -> Bool #

Eq (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

(==) :: Proxy s -> Proxy s -> Bool #

(/=) :: Proxy s -> Proxy s -> Bool #

Eq a => Eq (Arg a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(==) :: Arg a b -> Arg a b -> Bool #

(/=) :: Arg a b -> Arg a b -> Bool #

Eq (TypeRep a)

Since: base-2.1

Instance details

Defined in Data.Typeable.Internal

Methods

(==) :: TypeRep a -> TypeRep a -> Bool #

(/=) :: TypeRep a -> TypeRep a -> Bool #

Eq (U1 p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: U1 p -> U1 p -> Bool #

(/=) :: U1 p -> U1 p -> Bool #

Eq (V1 p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: V1 p -> V1 p -> Bool #

(/=) :: V1 p -> V1 p -> Bool #

Eq (STRef s a)

Pointer equality.

Since: base-2.1

Instance details

Defined in GHC.STRef

Methods

(==) :: STRef s a -> STRef s a -> Bool #

(/=) :: STRef s a -> STRef s a -> 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 #

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 a, Ord b) => Eq (Gr a b) 
Instance details

Defined in Data.Graph.Inductive.PatriciaTree

Methods

(==) :: Gr a b -> Gr a b -> Bool #

(/=) :: Gr a b -> Gr a b -> Bool #

(Eq1 f, Eq a) => Eq (Cofree f a) 
Instance details

Defined in Control.Comonad.Cofree

Methods

(==) :: Cofree f a -> Cofree f a -> Bool #

(/=) :: Cofree f a -> Cofree f a -> Bool #

(Eq1 f, Eq a) => Eq (Free f a) 
Instance details

Defined in Control.Monad.Free

Methods

(==) :: Free f a -> Free f a -> Bool #

(/=) :: Free f a -> Free f a -> Bool #

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 (MutVar s a) 
Instance details

Defined in Data.Primitive.MutVar

Methods

(==) :: MutVar s a -> MutVar s a -> Bool #

(/=) :: MutVar s a -> MutVar s a -> Bool #

Eq (MutablePrimArray s a) 
Instance details

Defined in Data.Primitive.PrimArray

Eq (SmallMutableArray s a) 
Instance details

Defined in Data.Primitive.SmallArray

Eq (MutableUnliftedArray s a) 
Instance details

Defined in Data.Primitive.Unlifted.Array

(Eq a, Eq b) => Eq (Either a b) 
Instance details

Defined in Data.Strict.Either

Methods

(==) :: Either a b -> Either a b -> Bool #

(/=) :: Either a b -> Either a b -> Bool #

(Eq a, Eq b) => Eq (These a b) 
Instance details

Defined in Data.Strict.These

Methods

(==) :: These a b -> These a b -> Bool #

(/=) :: These a b -> These a b -> Bool #

(Eq a, Eq b) => Eq (Pair a b) 
Instance details

Defined in Data.Strict.Tuple

Methods

(==) :: Pair a b -> Pair a b -> Bool #

(/=) :: Pair a b -> Pair a b -> Bool #

(Eq a, Eq b) => Eq (These a b) 
Instance details

Defined in Data.These

Methods

(==) :: These a b -> These a b -> Bool #

(/=) :: These a b -> These a b -> Bool #

(Eq1 f, Eq a) => Eq (Lift f a) 
Instance details

Defined in Control.Applicative.Lift

Methods

(==) :: Lift f a -> Lift f a -> Bool #

(/=) :: Lift f a -> Lift f a -> Bool #

(Eq1 m, Eq a) => Eq (ListT m a) 
Instance details

Defined in Control.Monad.Trans.List

Methods

(==) :: ListT m a -> ListT m a -> Bool #

(/=) :: ListT m a -> ListT m a -> Bool #

(Eq1 m, Eq a) => Eq (MaybeT m a) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

(==) :: MaybeT m a -> MaybeT m a -> Bool #

(/=) :: MaybeT m a -> MaybeT m a -> Bool #

(Eq k, Eq v) => Eq (HashMap k v)

Note that, in the presence of hash collisions, equal HashMaps may behave differently, i.e. substitutivity may be violated:

>>> data D = A | B deriving (Eq, Show)
>>> instance Hashable D where hashWithSalt salt _d = salt
>>> x = fromList [(A,1), (B,2)]
>>> y = fromList [(B,2), (A,1)]
>>> x == y
True
>>> toList x
[(A,1),(B,2)]
>>> toList y
[(B,2),(A,1)]

In general, the lack of substitutivity can be observed with any function that depends on the key ordering, such as folds and traversals.

Instance details

Defined in Data.HashMap.Internal

Methods

(==) :: HashMap k v -> HashMap k v -> Bool #

(/=) :: HashMap k v -> HashMap k v -> Bool #

(Eq k, Eq v) => Eq (Leaf k v) 
Instance details

Defined in Data.HashMap.Internal

Methods

(==) :: Leaf k v -> Leaf k v -> Bool #

(/=) :: Leaf k v -> Leaf k v -> Bool #

(Eq a, Eq b) => Eq (a, b) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b) -> (a, b) -> Bool #

(/=) :: (a, b) -> (a, b) -> Bool #

Eq a => Eq (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

(==) :: Const a b -> Const a b -> Bool #

(/=) :: Const a b -> Const a b -> Bool #

Eq (f a) => Eq (Ap f a)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

(==) :: Ap f a -> Ap f a -> Bool #

(/=) :: Ap f a -> Ap f a -> Bool #

Eq (f a) => Eq (Alt f a)

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

(==) :: Alt f a -> Alt f a -> Bool #

(/=) :: Alt f a -> Alt f a -> Bool #

Eq (a :~: b)

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Equality

Methods

(==) :: (a :~: b) -> (a :~: b) -> Bool #

(/=) :: (a :~: b) -> (a :~: b) -> Bool #

Eq (f p) => Eq (Rec1 f p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: Rec1 f p -> Rec1 f p -> Bool #

(/=) :: Rec1 f p -> Rec1 f p -> Bool #

Eq (URec (Ptr ()) p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool #

(/=) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool #

Eq (URec Char p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: URec Char p -> URec Char p -> Bool #

(/=) :: URec Char p -> URec Char p -> Bool #

Eq (URec Double p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: URec Double p -> URec Double p -> Bool #

(/=) :: URec Double p -> URec Double p -> Bool #

Eq (URec Float p) 
Instance details

Defined in GHC.Generics

Methods

(==) :: URec Float p -> URec Float p -> Bool #

(/=) :: URec Float p -> URec Float p -> Bool #

Eq (URec Int p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: URec Int p -> URec Int p -> Bool #

(/=) :: URec Int p -> URec Int p -> Bool #

Eq (URec Word p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: URec Word p -> URec Word p -> Bool #

(/=) :: URec Word p -> URec Word p -> Bool #

Eq (p a a) => Eq (Join p a) 
Instance details

Defined in Data.Bifunctor.Join

Methods

(==) :: Join p a -> Join p a -> Bool #

(/=) :: Join p a -> Join p a -> Bool #

Eq (Money owner btcl mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

(==) :: Money owner btcl mrel -> Money owner btcl mrel -> Bool #

(/=) :: Money owner btcl mrel -> Money owner btcl mrel -> Bool #

(Eq a, Eq (f b)) => Eq (FreeF f a b) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

(==) :: FreeF f a b -> FreeF f a b -> Bool #

(/=) :: FreeF f a b -> FreeF f a b -> Bool #

(Eq1 f, Eq1 m, Eq a) => Eq (FreeT f m a) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

(==) :: FreeT f m a -> FreeT f m a -> Bool #

(/=) :: FreeT f m a -> FreeT f m a -> Bool #

Eq b => Eq (Tagged s b) 
Instance details

Defined in Data.Tagged

Methods

(==) :: Tagged s b -> Tagged s b -> Bool #

(/=) :: Tagged s b -> Tagged s b -> Bool #

(Eq1 f, Eq1 g, Eq a) => Eq (These1 f g a) 
Instance details

Defined in Data.Functor.These

Methods

(==) :: These1 f g a -> These1 f g a -> Bool #

(/=) :: These1 f g a -> These1 f g a -> Bool #

(Eq1 f, Eq a) => Eq (Backwards f a) 
Instance details

Defined in Control.Applicative.Backwards

Methods

(==) :: Backwards f a -> Backwards f a -> Bool #

(/=) :: Backwards f a -> Backwards f a -> Bool #

(Eq e, Eq1 m, Eq a) => Eq (ErrorT e m a) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

(==) :: ErrorT e m a -> ErrorT e m a -> Bool #

(/=) :: ErrorT e m a -> ErrorT e m a -> Bool #

(Eq e, Eq1 m, Eq a) => Eq (ExceptT e m a) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

(==) :: ExceptT e m a -> ExceptT e m a -> Bool #

(/=) :: ExceptT e m a -> ExceptT e m a -> Bool #

(Eq1 f, Eq a) => Eq (IdentityT f a) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

(==) :: IdentityT f a -> IdentityT f a -> Bool #

(/=) :: IdentityT f a -> IdentityT f a -> Bool #

(Eq w, Eq1 m, Eq a) => Eq (WriterT w m a) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

(==) :: WriterT w m a -> WriterT w m a -> Bool #

(/=) :: WriterT w m a -> WriterT w m a -> Bool #

(Eq w, Eq1 m, Eq a) => Eq (WriterT w m a) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

(==) :: WriterT w m a -> WriterT w m a -> Bool #

(/=) :: WriterT w m a -> WriterT w m a -> Bool #

Eq a => Eq (Constant a b) 
Instance details

Defined in Data.Functor.Constant

Methods

(==) :: Constant a b -> Constant a b -> Bool #

(/=) :: Constant a b -> Constant a b -> Bool #

(Eq1 f, Eq a) => Eq (Reverse f a) 
Instance details

Defined in Data.Functor.Reverse

Methods

(==) :: Reverse f a -> Reverse f a -> Bool #

(/=) :: Reverse f a -> Reverse f a -> Bool #

(Eq a, Eq b, Eq c) => Eq (a, b, c) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c) -> (a, b, c) -> Bool #

(/=) :: (a, b, c) -> (a, b, c) -> Bool #

(Eq1 f, Eq1 g, Eq a) => Eq (Product f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Product

Methods

(==) :: Product f g a -> Product f g a -> Bool #

(/=) :: Product f g a -> Product f g a -> Bool #

(Eq1 f, Eq1 g, Eq a) => Eq (Sum f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Sum

Methods

(==) :: Sum f g a -> Sum f g a -> Bool #

(/=) :: Sum f g a -> Sum f g a -> Bool #

Eq (a :~~: b)

Since: base-4.10.0.0

Instance details

Defined in Data.Type.Equality

Methods

(==) :: (a :~~: b) -> (a :~~: b) -> Bool #

(/=) :: (a :~~: b) -> (a :~~: b) -> Bool #

(Eq (f p), Eq (g p)) => Eq ((f :*: g) p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: (f :*: g) p -> (f :*: g) p -> Bool #

(/=) :: (f :*: g) p -> (f :*: g) p -> Bool #

(Eq (f p), Eq (g p)) => Eq ((f :+: g) p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: (f :+: g) p -> (f :+: g) p -> Bool #

(/=) :: (f :+: g) p -> (f :+: g) p -> Bool #

Eq c => Eq (K1 i c p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: K1 i c p -> K1 i c p -> Bool #

(/=) :: K1 i c p -> K1 i c p -> Bool #

(Eq a, Eq b, Eq c, Eq d) => Eq (a, b, c, d) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d) -> (a, b, c, d) -> Bool #

(/=) :: (a, b, c, d) -> (a, b, c, d) -> Bool #

(Eq1 f, Eq1 g, Eq a) => Eq (Compose f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

(==) :: Compose f g a -> Compose f g a -> Bool #

(/=) :: Compose f g a -> Compose f g a -> Bool #

Eq (f (g p)) => Eq ((f :.: g) p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: (f :.: g) p -> (f :.: g) p -> Bool #

(/=) :: (f :.: g) p -> (f :.: g) p -> Bool #

Eq (f p) => Eq (M1 i c f p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: M1 i c f p -> M1 i c f p -> Bool #

(/=) :: M1 i c f p -> M1 i c f p -> Bool #

Eq (f a) => Eq (Clown f a b) 
Instance details

Defined in Data.Bifunctor.Clown

Methods

(==) :: Clown f a b -> Clown f a b -> Bool #

(/=) :: Clown f a b -> Clown f a b -> Bool #

Eq (p b a) => Eq (Flip p a b) 
Instance details

Defined in Data.Bifunctor.Flip

Methods

(==) :: Flip p a b -> Flip p a b -> Bool #

(/=) :: Flip p a b -> Flip p a b -> Bool #

Eq (g b) => Eq (Joker g a b) 
Instance details

Defined in Data.Bifunctor.Joker

Methods

(==) :: Joker g a b -> Joker g a b -> Bool #

(/=) :: Joker g a b -> Joker g a b -> Bool #

Eq (p a b) => Eq (WrappedBifunctor p a b) 
Instance details

Defined in Data.Bifunctor.Wrapped

Methods

(==) :: WrappedBifunctor p a b -> WrappedBifunctor p a b -> Bool #

(/=) :: WrappedBifunctor p a b -> WrappedBifunctor p a b -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e) => Eq (a, b, c, d, e) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e) -> (a, b, c, d, e) -> Bool #

(/=) :: (a, b, c, d, e) -> (a, b, c, d, e) -> Bool #

(Eq (f a b), Eq (g a b)) => Eq (Product f g a b) 
Instance details

Defined in Data.Bifunctor.Product

Methods

(==) :: Product f g a b -> Product f g a b -> Bool #

(/=) :: Product f g a b -> Product f g a b -> Bool #

(Eq (p a b), Eq (q a b)) => Eq (Sum p q a b) 
Instance details

Defined in Data.Bifunctor.Sum

Methods

(==) :: Sum p q a b -> Sum p q a b -> Bool #

(/=) :: Sum p q a b -> Sum p q a b -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f) => Eq (a, b, c, d, e, f) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> Bool #

(/=) :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> Bool #

Eq (f (p a b)) => Eq (Tannen f p a b) 
Instance details

Defined in Data.Bifunctor.Tannen

Methods

(==) :: Tannen f p a b -> Tannen f p a b -> Bool #

(/=) :: Tannen f p a b -> Tannen f p a b -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g) => Eq (a, b, c, d, e, f, g) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> Bool #

(/=) :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h) => Eq (a, b, c, d, e, f, g, h) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> Bool #

(/=) :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> Bool #

Eq (p (f a) (g b)) => Eq (Biff p f g a b) 
Instance details

Defined in Data.Bifunctor.Biff

Methods

(==) :: Biff p f g a b -> Biff p f g a b -> Bool #

(/=) :: Biff p f g a b -> Biff p f g a b -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i) => Eq (a, b, c, d, e, f, g, h, i) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> Bool #

(/=) :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j) => Eq (a, b, c, d, e, f, g, h, i, j) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> Bool #

(/=) :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j, Eq k) => Eq (a, b, c, d, e, f, g, h, i, j, k) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> Bool #

(/=) :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j, Eq k, Eq l) => Eq (a, b, c, d, e, f, g, h, i, j, k, l) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> Bool #

(/=) :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j, Eq k, Eq l, Eq m) => Eq (a, b, c, d, e, f, g, h, i, j, k, l, m) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Bool #

(/=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j, Eq k, Eq l, Eq m, Eq n) => Eq (a, b, c, d, e, f, g, h, i, j, k, l, m, n) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Bool #

(/=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j, Eq k, Eq l, Eq m, Eq n, Eq o) => Eq (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Bool #

(/=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Bool #

class Fractional a => Floating a where #

Trigonometric and hyperbolic functions and related functions.

The Haskell Report defines no laws for Floating. However, (+), (*) and exp are customarily expected to define an exponential field and have the following properties:

  • exp (a + b) = exp a * exp b
  • exp (fromInteger 0) = fromInteger 1

Minimal complete definition

pi, exp, log, sin, cos, asin, acos, atan, sinh, cosh, asinh, acosh, atanh

Methods

pi :: a #

exp :: a -> a #

sqrt :: a -> a #

(**) :: a -> a -> a infixr 8 #

logBase :: a -> a -> a #

sin :: a -> a #

cos :: a -> a #

tan :: a -> a #

asin :: a -> a #

acos :: a -> a #

atan :: a -> a #

sinh :: a -> a #

cosh :: a -> a #

tanh :: a -> a #

asinh :: a -> a #

acosh :: a -> a #

atanh :: a -> a #

Instances

Instances details
Floating CDouble 
Instance details

Defined in Foreign.C.Types

Floating CFloat 
Instance details

Defined in Foreign.C.Types

Floating Double

Since: base-2.1

Instance details

Defined in GHC.Float

Floating Float

Since: base-2.1

Instance details

Defined in GHC.Float

RealFloat a => Floating (Complex a)

Since: base-2.1

Instance details

Defined in Data.Complex

Methods

pi :: Complex a #

exp :: Complex a -> Complex a #

log :: Complex a -> Complex a #

sqrt :: Complex a -> Complex a #

(**) :: Complex a -> Complex a -> Complex a #

logBase :: Complex a -> Complex a -> Complex a #

sin :: Complex a -> Complex a #

cos :: Complex a -> Complex a #

tan :: Complex a -> Complex a #

asin :: Complex a -> Complex a #

acos :: Complex a -> Complex a #

atan :: Complex a -> Complex a #

sinh :: Complex a -> Complex a #

cosh :: Complex a -> Complex a #

tanh :: Complex a -> Complex a #

asinh :: Complex a -> Complex a #

acosh :: Complex a -> Complex a #

atanh :: Complex a -> Complex a #

log1p :: Complex a -> Complex a #

expm1 :: Complex a -> Complex a #

log1pexp :: Complex a -> Complex a #

log1mexp :: Complex a -> Complex a #

Floating a => Floating (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Floating a => Floating (Down a)

Since: base-4.14.0.0

Instance details

Defined in Data.Ord

Methods

pi :: Down a #

exp :: Down a -> Down a #

log :: Down a -> Down a #

sqrt :: Down a -> Down a #

(**) :: Down a -> Down a -> Down a #

logBase :: Down a -> Down a -> Down a #

sin :: Down a -> Down a #

cos :: Down a -> Down a #

tan :: Down a -> Down a #

asin :: Down a -> Down a #

acos :: Down a -> Down a #

atan :: Down a -> Down a #

sinh :: Down a -> Down a #

cosh :: Down a -> Down a #

tanh :: Down a -> Down a #

asinh :: Down a -> Down a #

acosh :: Down a -> Down a #

atanh :: Down a -> Down a #

log1p :: Down a -> Down a #

expm1 :: Down a -> Down a #

log1pexp :: Down a -> Down a #

log1mexp :: Down a -> Down a #

Floating a => Floating (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

pi :: Const a b #

exp :: Const a b -> Const a b #

log :: Const a b -> Const a b #

sqrt :: Const a b -> Const a b #

(**) :: Const a b -> Const a b -> Const a b #

logBase :: Const a b -> Const a b -> Const a b #

sin :: Const a b -> Const a b #

cos :: Const a b -> Const a b #

tan :: Const a b -> Const a b #

asin :: Const a b -> Const a b #

acos :: Const a b -> Const a b #

atan :: Const a b -> Const a b #

sinh :: Const a b -> Const a b #

cosh :: Const a b -> Const a b #

tanh :: Const a b -> Const a b #

asinh :: Const a b -> Const a b #

acosh :: Const a b -> Const a b #

atanh :: Const a b -> Const a b #

log1p :: Const a b -> Const a b #

expm1 :: Const a b -> Const a b #

log1pexp :: Const a b -> Const a b #

log1mexp :: Const a b -> Const a b #

Floating a => Floating (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

pi :: Tagged s a #

exp :: Tagged s a -> Tagged s a #

log :: Tagged s a -> Tagged s a #

sqrt :: Tagged s a -> Tagged s a #

(**) :: Tagged s a -> Tagged s a -> Tagged s a #

logBase :: Tagged s a -> Tagged s a -> Tagged s a #

sin :: Tagged s a -> Tagged s a #

cos :: Tagged s a -> Tagged s a #

tan :: Tagged s a -> Tagged s a #

asin :: Tagged s a -> Tagged s a #

acos :: Tagged s a -> Tagged s a #

atan :: Tagged s a -> Tagged s a #

sinh :: Tagged s a -> Tagged s a #

cosh :: Tagged s a -> Tagged s a #

tanh :: Tagged s a -> Tagged s a #

asinh :: Tagged s a -> Tagged s a #

acosh :: Tagged s a -> Tagged s a #

atanh :: Tagged s a -> Tagged s a #

log1p :: Tagged s a -> Tagged s a #

expm1 :: Tagged s a -> Tagged s a #

log1pexp :: Tagged s a -> Tagged s a #

log1mexp :: Tagged s a -> Tagged s a #

class Num a => Fractional a where #

Fractional numbers, supporting real division.

The Haskell Report defines no laws for Fractional. However, (+) and (*) are customarily expected to define a division ring and have the following properties:

recip gives the multiplicative inverse
x * recip x = recip x * x = fromInteger 1

Note that it isn't customarily expected that a type instance of Fractional implement a field. However, all instances in base do.

Minimal complete definition

fromRational, (recip | (/))

Methods

(/) :: a -> a -> a infixl 7 #

Fractional division.

recip :: a -> a #

Reciprocal fraction.

fromRational :: Rational -> a #

Conversion from a Rational (that is Ratio Integer). A floating literal stands for an application of fromRational to a value of type Rational, so such literals have type (Fractional a) => a.

Instances

Instances details
Fractional CDouble 
Instance details

Defined in Foreign.C.Types

Fractional CFloat 
Instance details

Defined in Foreign.C.Types

Fractional Scientific

WARNING: recip and / will throw an error when their outputs are repeating decimals.

fromRational will throw an error when the input Rational is a repeating decimal. Consider using fromRationalRepetend for these rationals which will detect the repetition and indicate where it starts.

Instance details

Defined in Data.Scientific

Fractional AbsoluteSize 
Instance details

Defined in Text.Internal.CssCommon

Fractional EmSize 
Instance details

Defined in Text.Internal.CssCommon

Fractional ExSize 
Instance details

Defined in Text.Internal.CssCommon

Fractional PercentageSize 
Instance details

Defined in Text.Internal.CssCommon

Fractional PixelSize 
Instance details

Defined in Text.Internal.CssCommon

Fractional DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Fractional NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

RealFloat a => Fractional (Complex a)

Since: base-2.1

Instance details

Defined in Data.Complex

Methods

(/) :: Complex a -> Complex a -> Complex a #

recip :: Complex a -> Complex a #

fromRational :: Rational -> Complex a #

Fractional a => Fractional (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Fractional a => Fractional (Down a)

Since: base-4.14.0.0

Instance details

Defined in Data.Ord

Methods

(/) :: Down a -> Down a -> Down a #

recip :: Down a -> Down a #

fromRational :: Rational -> Down a #

Integral a => Fractional (Ratio a)

Since: base-2.0.1

Instance details

Defined in GHC.Real

Methods

(/) :: Ratio a -> Ratio a -> Ratio a #

recip :: Ratio a -> Ratio a #

fromRational :: Rational -> Ratio a #

HasResolution a => Fractional (Fixed a)

Since: base-2.1

Instance details

Defined in Data.Fixed

Methods

(/) :: Fixed a -> Fixed a -> Fixed a #

recip :: Fixed a -> Fixed a #

fromRational :: Rational -> Fixed a #

Fractional a => Fractional (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

(/) :: Const a b -> Const a b -> Const a b #

recip :: Const a b -> Const a b #

fromRational :: Rational -> Const a b #

Fractional a => Fractional (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

(/) :: Tagged s a -> Tagged s a -> Tagged s a #

recip :: Tagged s a -> Tagged s a #

fromRational :: Rational -> Tagged s a #

class (Real a, Enum a) => Integral a where #

Integral numbers, supporting integer division.

The Haskell Report defines no laws for Integral. However, Integral instances are customarily expected to define a Euclidean domain and have the following properties for the div/mod and quot/rem pairs, given suitable Euclidean functions f and g:

  • x = y * quot x y + rem x y with rem x y = fromInteger 0 or g (rem x y) < g y
  • x = y * div x y + mod x y with mod x y = fromInteger 0 or f (mod x y) < f y

An example of a suitable Euclidean function, for Integer's instance, is abs.

Minimal complete definition

quotRem, toInteger

Methods

quot :: a -> a -> a infixl 7 #

integer division truncated toward zero

rem :: a -> a -> a infixl 7 #

integer remainder, satisfying

(x `quot` y)*y + (x `rem` y) == x

div :: a -> a -> a infixl 7 #

integer division truncated toward negative infinity

mod :: a -> a -> a infixl 7 #

integer modulus, satisfying

(x `div` y)*y + (x `mod` y) == x

quotRem :: a -> a -> (a, a) #

simultaneous quot and rem

divMod :: a -> a -> (a, a) #

simultaneous div and mod

toInteger :: a -> Integer #

conversion to Integer

Instances

Instances details
Integral CBool 
Instance details

Defined in Foreign.C.Types

Integral CChar 
Instance details

Defined in Foreign.C.Types

Integral CInt 
Instance details

Defined in Foreign.C.Types

Methods

quot :: CInt -> CInt -> CInt #

rem :: CInt -> CInt -> CInt #

div :: CInt -> CInt -> CInt #

mod :: CInt -> CInt -> CInt #

quotRem :: CInt -> CInt -> (CInt, CInt) #

divMod :: CInt -> CInt -> (CInt, CInt) #

toInteger :: CInt -> Integer #

Integral CIntMax 
Instance details

Defined in Foreign.C.Types

Integral CIntPtr 
Instance details

Defined in Foreign.C.Types

Integral CLLong 
Instance details

Defined in Foreign.C.Types

Integral CLong 
Instance details

Defined in Foreign.C.Types

Integral CPtrdiff 
Instance details

Defined in Foreign.C.Types

Integral CSChar 
Instance details

Defined in Foreign.C.Types

Integral CShort 
Instance details

Defined in Foreign.C.Types

Integral CSigAtomic 
Instance details

Defined in Foreign.C.Types

Integral CSize 
Instance details

Defined in Foreign.C.Types

Integral CUChar 
Instance details

Defined in Foreign.C.Types

Integral CUInt 
Instance details

Defined in Foreign.C.Types

Integral CUIntMax 
Instance details

Defined in Foreign.C.Types

Integral CUIntPtr 
Instance details

Defined in Foreign.C.Types

Integral CULLong 
Instance details

Defined in Foreign.C.Types

Integral CULong 
Instance details

Defined in Foreign.C.Types

Integral CUShort 
Instance details

Defined in Foreign.C.Types

Integral CWchar 
Instance details

Defined in Foreign.C.Types

Integral Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Integral Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Integral Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Integral Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

quot :: Int8 -> Int8 -> Int8 #

rem :: Int8 -> Int8 -> Int8 #

div :: Int8 -> Int8 -> Int8 #

mod :: Int8 -> Int8 -> Int8 #

quotRem :: Int8 -> Int8 -> (Int8, Int8) #

divMod :: Int8 -> Int8 -> (Int8, Int8) #

toInteger :: Int8 -> Integer #

Integral Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Integral Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Integral Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Integral CBlkCnt 
Instance details

Defined in System.Posix.Types

Integral CBlkSize 
Instance details

Defined in System.Posix.Types

Integral CClockId 
Instance details

Defined in System.Posix.Types

Integral CDev 
Instance details

Defined in System.Posix.Types

Methods

quot :: CDev -> CDev -> CDev #

rem :: CDev -> CDev -> CDev #

div :: CDev -> CDev -> CDev #

mod :: CDev -> CDev -> CDev #

quotRem :: CDev -> CDev -> (CDev, CDev) #

divMod :: CDev -> CDev -> (CDev, CDev) #

toInteger :: CDev -> Integer #

Integral CFsBlkCnt 
Instance details

Defined in System.Posix.Types

Integral CFsFilCnt 
Instance details

Defined in System.Posix.Types

Integral CGid 
Instance details

Defined in System.Posix.Types

Methods

quot :: CGid -> CGid -> CGid #

rem :: CGid -> CGid -> CGid #

div :: CGid -> CGid -> CGid #

mod :: CGid -> CGid -> CGid #

quotRem :: CGid -> CGid -> (CGid, CGid) #

divMod :: CGid -> CGid -> (CGid, CGid) #

toInteger :: CGid -> Integer #

Integral CId 
Instance details

Defined in System.Posix.Types

Methods

quot :: CId -> CId -> CId #

rem :: CId -> CId -> CId #

div :: CId -> CId -> CId #

mod :: CId -> CId -> CId #

quotRem :: CId -> CId -> (CId, CId) #

divMod :: CId -> CId -> (CId, CId) #

toInteger :: CId -> Integer #

Integral CIno 
Instance details

Defined in System.Posix.Types

Methods

quot :: CIno -> CIno -> CIno #

rem :: CIno -> CIno -> CIno #

div :: CIno -> CIno -> CIno #

mod :: CIno -> CIno -> CIno #

quotRem :: CIno -> CIno -> (CIno, CIno) #

divMod :: CIno -> CIno -> (CIno, CIno) #

toInteger :: CIno -> Integer #

Integral CKey 
Instance details

Defined in System.Posix.Types

Methods

quot :: CKey -> CKey -> CKey #

rem :: CKey -> CKey -> CKey #

div :: CKey -> CKey -> CKey #

mod :: CKey -> CKey -> CKey #

quotRem :: CKey -> CKey -> (CKey, CKey) #

divMod :: CKey -> CKey -> (CKey, CKey) #

toInteger :: CKey -> Integer #

Integral CMode 
Instance details

Defined in System.Posix.Types

Integral CNfds 
Instance details

Defined in System.Posix.Types

Integral CNlink 
Instance details

Defined in System.Posix.Types

Integral COff 
Instance details

Defined in System.Posix.Types

Methods

quot :: COff -> COff -> COff #

rem :: COff -> COff -> COff #

div :: COff -> COff -> COff #

mod :: COff -> COff -> COff #

quotRem :: COff -> COff -> (COff, COff) #

divMod :: COff -> COff -> (COff, COff) #

toInteger :: COff -> Integer #

Integral CPid 
Instance details

Defined in System.Posix.Types

Methods

quot :: CPid -> CPid -> CPid #

rem :: CPid -> CPid -> CPid #

div :: CPid -> CPid -> CPid #

mod :: CPid -> CPid -> CPid #

quotRem :: CPid -> CPid -> (CPid, CPid) #

divMod :: CPid -> CPid -> (CPid, CPid) #

toInteger :: CPid -> Integer #

Integral CRLim 
Instance details

Defined in System.Posix.Types

Integral CSocklen 
Instance details

Defined in System.Posix.Types

Integral CSsize 
Instance details

Defined in System.Posix.Types

Integral CTcflag 
Instance details

Defined in System.Posix.Types

Integral CUid 
Instance details

Defined in System.Posix.Types

Methods

quot :: CUid -> CUid -> CUid #

rem :: CUid -> CUid -> CUid #

div :: CUid -> CUid -> CUid #

mod :: CUid -> CUid -> CUid #

quotRem :: CUid -> CUid -> (CUid, CUid) #

divMod :: CUid -> CUid -> (CUid, CUid) #

toInteger :: CUid -> Integer #

Integral Fd 
Instance details

Defined in System.Posix.Types

Methods

quot :: Fd -> Fd -> Fd #

rem :: Fd -> Fd -> Fd #

div :: Fd -> Fd -> Fd #

mod :: Fd -> Fd -> Fd #

quotRem :: Fd -> Fd -> (Fd, Fd) #

divMod :: Fd -> Fd -> (Fd, Fd) #

toInteger :: Fd -> Integer #

Integral GCPort Source # 
Instance details

Defined in BtcLsp.Grpc.Client.LowLevel

Integral TimeSpec 
Instance details

Defined in System.Clock

Integral Seconds 
Instance details

Defined in LndClient.Data.Newtype

Methods

quot :: Seconds -> Seconds -> Seconds #

rem :: Seconds -> Seconds -> Seconds #

div :: Seconds -> Seconds -> Seconds #

mod :: Seconds -> Seconds -> Seconds #

quotRem :: Seconds -> Seconds -> (Seconds, Seconds) #

divMod :: Seconds -> Seconds -> (Seconds, Seconds) #

toInteger :: Seconds -> Integer #

Integral PortNumber 
Instance details

Defined in Network.Socket.Types

Integral Int128 
Instance details

Defined in Data.WideWord.Int128

Integral Word128 
Instance details

Defined in Data.WideWord.Word128

Integral Word256 
Instance details

Defined in Data.WideWord.Word256

Integral Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Integral Integer

Since: base-2.0.1

Instance details

Defined in GHC.Real

Integral Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Real

Integral Int

Since: base-2.0.1

Instance details

Defined in GHC.Real

Methods

quot :: Int -> Int -> Int #

rem :: Int -> Int -> Int #

div :: Int -> Int -> Int #

mod :: Int -> Int -> Int #

quotRem :: Int -> Int -> (Int, Int) #

divMod :: Int -> Int -> (Int, Int) #

toInteger :: Int -> Integer #

Integral Word

Since: base-2.1

Instance details

Defined in GHC.Real

Methods

quot :: Word -> Word -> Word #

rem :: Word -> Word -> Word #

div :: Word -> Word -> Word #

mod :: Word -> Word -> Word #

quotRem :: Word -> Word -> (Word, Word) #

divMod :: Word -> Word -> (Word, Word) #

toInteger :: Word -> Integer #

Integral a => Integral (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

(BackendCompatible b s, Integral (BackendKey b)) => Integral (BackendKey (Compatible b s)) 
Instance details

Defined in Database.Persist.Compatible.Types

(PersistCore b, PersistCore (RawPostgresql b), Integral (BackendKey b)) => Integral (BackendKey (RawPostgresql b)) 
Instance details

Defined in Database.Persist.Postgresql

Integral a => Integral (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

quot :: Const a b -> Const a b -> Const a b #

rem :: Const a b -> Const a b -> Const a b #

div :: Const a b -> Const a b -> Const a b #

mod :: Const a b -> Const a b -> Const a b #

quotRem :: Const a b -> Const a b -> (Const a b, Const a b) #

divMod :: Const a b -> Const a b -> (Const a b, Const a b) #

toInteger :: Const a b -> Integer #

Integral a => Integral (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

quot :: Tagged s a -> Tagged s a -> Tagged s a #

rem :: Tagged s a -> Tagged s a -> Tagged s a #

div :: Tagged s a -> Tagged s a -> Tagged s a #

mod :: Tagged s a -> Tagged s a -> Tagged s a #

quotRem :: Tagged s a -> Tagged s a -> (Tagged s a, Tagged s a) #

divMod :: Tagged s a -> Tagged s a -> (Tagged s a, Tagged s a) #

toInteger :: Tagged s a -> Integer #

class Applicative m => Monad (m :: Type -> Type) where #

The Monad class defines the basic operations over a monad, a concept from a branch of mathematics known as category theory. From the perspective of a Haskell programmer, however, it is best to think of a monad as an abstract datatype of actions. Haskell's do expressions provide a convenient syntax for writing monadic expressions.

Instances of Monad should satisfy the following:

Left identity
return a >>= k = k a
Right identity
m >>= return = m
Associativity
m >>= (\x -> k x >>= h) = (m >>= k) >>= h

Furthermore, the Monad and Applicative operations should relate as follows:

The above laws imply:

and that pure and (<*>) satisfy the applicative functor laws.

The instances of Monad for lists, Maybe and IO defined in the Prelude satisfy these laws.

Minimal complete definition

(>>=)

Methods

(>>=) :: m a -> (a -> m b) -> m b infixl 1 #

Sequentially compose two actions, passing any value produced by the first as an argument to the second.

'as >>= bs' can be understood as the do expression

do a <- as
   bs a

(>>) :: m a -> m b -> m b infixl 1 #

Sequentially compose two actions, discarding any value produced by the first, like sequencing operators (such as the semicolon) in imperative languages.

'as >> bs' can be understood as the do expression

do as
   bs

return :: a -> m a #

Inject a value into the monadic type.

Instances

Instances details
Monad IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

(>>=) :: IResult a -> (a -> IResult b) -> IResult b #

(>>) :: IResult a -> IResult b -> IResult b #

return :: a -> IResult a #

Monad Parser 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

(>>=) :: Parser a -> (a -> Parser b) -> Parser b #

(>>) :: Parser a -> Parser b -> Parser b #

return :: a -> Parser a #

Monad Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

(>>=) :: Result a -> (a -> Result b) -> Result b #

(>>) :: Result a -> Result b -> Result b #

return :: a -> Result a #

Monad Complex

Since: base-4.9.0.0

Instance details

Defined in Data.Complex

Methods

(>>=) :: Complex a -> (a -> Complex b) -> Complex b #

(>>) :: Complex a -> Complex b -> Complex b #

return :: a -> Complex a #

Monad Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

(>>=) :: Identity a -> (a -> Identity b) -> Identity b #

(>>) :: Identity a -> Identity b -> Identity b #

return :: a -> Identity a #

Monad First

Since: base-4.8.0.0

Instance details

Defined in Data.Monoid

Methods

(>>=) :: First a -> (a -> First b) -> First b #

(>>) :: First a -> First b -> First b #

return :: a -> First a #

Monad Last

Since: base-4.8.0.0

Instance details

Defined in Data.Monoid

Methods

(>>=) :: Last a -> (a -> Last b) -> Last b #

(>>) :: Last a -> Last b -> Last b #

return :: a -> Last a #

Monad Down

Since: base-4.11.0.0

Instance details

Defined in Data.Ord

Methods

(>>=) :: Down a -> (a -> Down b) -> Down b #

(>>) :: Down a -> Down b -> Down b #

return :: a -> Down a #

Monad First

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(>>=) :: First a -> (a -> First b) -> First b #

(>>) :: First a -> First b -> First b #

return :: a -> First a #

Monad Last

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(>>=) :: Last a -> (a -> Last b) -> Last b #

(>>) :: Last a -> Last b -> Last b #

return :: a -> Last a #

Monad Max

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(>>=) :: Max a -> (a -> Max b) -> Max b #

(>>) :: Max a -> Max b -> Max b #

return :: a -> Max a #

Monad Min

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(>>=) :: Min a -> (a -> Min b) -> Min b #

(>>) :: Min a -> Min b -> Min b #

return :: a -> Min a #

Monad 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 #

Monad Dual

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

(>>=) :: Dual a -> (a -> Dual b) -> Dual b #

(>>) :: Dual a -> Dual b -> Dual b #

return :: a -> Dual a #

Monad Product

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

(>>=) :: Product a -> (a -> Product b) -> Product b #

(>>) :: Product a -> Product b -> Product b #

return :: a -> Product a #

Monad Sum

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

(>>=) :: Sum a -> (a -> Sum b) -> Sum b #

(>>) :: Sum a -> Sum b -> Sum b #

return :: a -> Sum a #

Monad NonEmpty

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

(>>=) :: NonEmpty a -> (a -> NonEmpty b) -> NonEmpty b #

(>>) :: NonEmpty a -> NonEmpty b -> NonEmpty b #

return :: a -> NonEmpty a #

Monad STM

Since: base-4.3.0.0

Instance details

Defined in GHC.Conc.Sync

Methods

(>>=) :: STM a -> (a -> STM b) -> STM b #

(>>) :: STM a -> STM b -> STM b #

return :: a -> STM a #

Monad Par1

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

(>>=) :: Par1 a -> (a -> Par1 b) -> Par1 b #

(>>) :: Par1 a -> Par1 b -> Par1 b #

return :: a -> Par1 a #

Monad P

Since: base-2.1

Instance details

Defined in Text.ParserCombinators.ReadP

Methods

(>>=) :: P a -> (a -> P b) -> P b #

(>>) :: P a -> P b -> P b #

return :: a -> P a #

Monad ReadP

Since: base-2.1

Instance details

Defined in Text.ParserCombinators.ReadP

Methods

(>>=) :: ReadP a -> (a -> ReadP b) -> ReadP b #

(>>) :: ReadP a -> ReadP b -> ReadP b #

return :: a -> ReadP a #

Monad 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 #

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 #

Monad MarkupM 
Instance details

Defined in Text.Blaze.Internal

Methods

(>>=) :: MarkupM a -> (a -> MarkupM b) -> MarkupM b #

(>>) :: MarkupM a -> MarkupM b -> MarkupM b #

return :: a -> MarkupM a #

Monad Put 
Instance details

Defined in Data.ByteString.Builder.Internal

Methods

(>>=) :: Put a -> (a -> Put b) -> Put b #

(>>) :: Put a -> Put b -> Put b #

return :: a -> Put a #

Monad Identifier 
Instance details

Defined in Text.Casing

Methods

(>>=) :: Identifier a -> (a -> Identifier b) -> Identifier b #

(>>) :: Identifier a -> Identifier b -> Identifier b #

return :: a -> Identifier a #

Monad Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

(>>=) :: Seq a -> (a -> Seq b) -> Seq b #

(>>) :: Seq a -> Seq b -> Seq b #

return :: a -> Seq a #

Monad Tree 
Instance details

Defined in Data.Tree

Methods

(>>=) :: Tree a -> (a -> Tree b) -> Tree b #

(>>) :: Tree a -> Tree b -> Tree b #

return :: a -> Tree a #

Monad CryptoFailable 
Instance details

Defined in Crypto.Error.Types

Monad DNonEmpty 
Instance details

Defined in Data.DList.DNonEmpty.Internal

Methods

(>>=) :: DNonEmpty a -> (a -> DNonEmpty b) -> DNonEmpty b #

(>>) :: DNonEmpty a -> DNonEmpty b -> DNonEmpty b #

return :: a -> DNonEmpty a #

Monad DList 
Instance details

Defined in Data.DList.Internal

Methods

(>>=) :: DList a -> (a -> DList b) -> DList b #

(>>) :: DList a -> DList b -> DList b #

return :: a -> DList a #

Monad SqlQuery 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Methods

(>>=) :: SqlQuery a -> (a -> SqlQuery b) -> SqlQuery b #

(>>) :: SqlQuery a -> SqlQuery b -> SqlQuery b #

return :: a -> SqlQuery a #

Monad Value 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Methods

(>>=) :: Value a -> (a -> Value b) -> Value b #

(>>) :: Value a -> Value b -> Value b #

return :: a -> Value a #

Monad IO

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

(>>=) :: IO a -> (a -> IO b) -> IO b #

(>>) :: IO a -> IO b -> IO b #

return :: a -> IO a #

Monad Conversion 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Methods

(>>=) :: Conversion a -> (a -> Conversion b) -> Conversion b #

(>>) :: Conversion a -> Conversion b -> Conversion b #

return :: a -> Conversion a #

Monad RowParser 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Methods

(>>=) :: RowParser a -> (a -> RowParser b) -> RowParser b #

(>>) :: RowParser a -> RowParser b -> RowParser b #

return :: a -> RowParser a #

Monad Array 
Instance details

Defined in Data.Primitive.Array

Methods

(>>=) :: Array a -> (a -> Array b) -> Array b #

(>>) :: Array a -> Array b -> Array b #

return :: a -> Array a #

Monad SmallArray 
Instance details

Defined in Data.Primitive.SmallArray

Methods

(>>=) :: SmallArray a -> (a -> SmallArray b) -> SmallArray b #

(>>) :: SmallArray a -> SmallArray b -> SmallArray b #

return :: a -> SmallArray a #

Monad 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 #

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 #

Monad Acquire 
Instance details

Defined in Data.Acquire.Internal

Methods

(>>=) :: Acquire a -> (a -> Acquire b) -> Acquire b #

(>>) :: Acquire a -> Acquire b -> Acquire b #

return :: a -> Acquire a #

Monad Result 
Instance details

Defined in Text.Hamlet.Parse

Methods

(>>=) :: Result a -> (a -> Result b) -> Result b #

(>>) :: Result a -> Result b -> Result b #

return :: a -> Result a #

Monad Q 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(>>=) :: Q a -> (a -> Q b) -> Q b #

(>>) :: Q a -> Q b -> Q b #

return :: a -> Q a #

Monad Memoized 
Instance details

Defined in UnliftIO.Memoize

Methods

(>>=) :: Memoized a -> (a -> Memoized b) -> Memoized b #

(>>) :: Memoized a -> Memoized b -> Memoized b #

return :: a -> Memoized a #

Monad Vector 
Instance details

Defined in Data.Vector

Methods

(>>=) :: Vector a -> (a -> Vector b) -> Vector b #

(>>) :: Vector a -> Vector b -> Vector b #

return :: a -> Vector a #

Monad 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 #

Monad Id 
Instance details

Defined in Data.Vector.Fusion.Util

Methods

(>>=) :: Id a -> (a -> Id b) -> Id b #

(>>) :: Id a -> Id b -> Id b #

return :: a -> Id a #

Monad Stream 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

(>>=) :: Stream a -> (a -> Stream b) -> Stream b #

(>>) :: Stream a -> Stream b -> Stream b #

return :: a -> Stream a #

Monad Maybe

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

(>>=) :: Maybe a -> (a -> Maybe b) -> Maybe b #

(>>) :: Maybe a -> Maybe b -> Maybe b #

return :: a -> Maybe a #

Monad Solo

Since: base-4.15

Instance details

Defined in GHC.Base

Methods

(>>=) :: Solo a -> (a -> Solo b) -> Solo b #

(>>) :: Solo a -> Solo b -> Solo b #

return :: a -> Solo a #

Monad []

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

(>>=) :: [a] -> (a -> [b]) -> [b] #

(>>) :: [a] -> [b] -> [b] #

return :: a -> [a] #

Representable f => Monad (Co f) 
Instance details

Defined in Data.Functor.Rep

Methods

(>>=) :: Co f a -> (a -> Co f b) -> Co f b #

(>>) :: Co f a -> Co f b -> Co f b #

return :: a -> Co f a #

Monad (Parser i) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

(>>=) :: Parser i a -> (a -> Parser i b) -> Parser i b #

(>>) :: Parser i a -> Parser i b -> Parser i b #

return :: a -> Parser i a #

Monad m => Monad (WrappedMonad m)

Since: base-4.7.0.0

Instance details

Defined in Control.Applicative

Methods

(>>=) :: WrappedMonad m a -> (a -> WrappedMonad m b) -> WrappedMonad m b #

(>>) :: WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m b #

return :: a -> WrappedMonad m a #

ArrowApply a => Monad (ArrowMonad a)

Since: base-2.1

Instance details

Defined in Control.Arrow

Methods

(>>=) :: ArrowMonad a a0 -> (a0 -> ArrowMonad a b) -> ArrowMonad a b #

(>>) :: ArrowMonad a a0 -> ArrowMonad a b -> ArrowMonad a b #

return :: a0 -> ArrowMonad a a0 #

Monad (ST s)

Since: base-2.1

Instance details

Defined in Control.Monad.ST.Lazy.Imp

Methods

(>>=) :: ST s a -> (a -> ST s b) -> ST s b #

(>>) :: ST s a -> ST s b -> ST s b #

return :: a -> ST s a #

Monad (Either e)

Since: base-4.4.0.0

Instance details

Defined in Data.Either

Methods

(>>=) :: Either e a -> (a -> Either e b) -> Either e b #

(>>) :: Either e a -> Either e b -> Either e b #

return :: a -> Either e a #

Monad (Proxy :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

(>>=) :: Proxy a -> (a -> Proxy b) -> Proxy b #

(>>) :: Proxy a -> Proxy b -> Proxy b #

return :: a -> Proxy a #

Monad (U1 :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

(>>=) :: U1 a -> (a -> U1 b) -> U1 b #

(>>) :: U1 a -> U1 b -> U1 b #

return :: a -> U1 a #

Monad (ST s)

Since: base-2.1

Instance details

Defined in GHC.ST

Methods

(>>=) :: ST s a -> (a -> ST s b) -> ST s b #

(>>) :: ST s a -> ST s b -> ST s b #

return :: a -> ST s a #

Monad m => Monad (AppM m) Source # 
Instance details

Defined in BtcLsp.Data.AppM

Methods

(>>=) :: AppM m a -> (a -> AppM m b) -> AppM m b #

(>>) :: AppM m a -> AppM m b -> AppM m b #

return :: a -> AppM 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 #

Monad (EitherR r) 
Instance details

Defined in Data.EitherR

Methods

(>>=) :: EitherR r a -> (a -> EitherR r b) -> EitherR r b #

(>>) :: EitherR r a -> EitherR r b -> EitherR r b #

return :: a -> EitherR r a #

Monad m => Monad (CatchT m) 
Instance details

Defined in Control.Monad.Catch.Pure

Methods

(>>=) :: CatchT m a -> (a -> CatchT m b) -> CatchT m b #

(>>) :: CatchT m a -> CatchT m b -> CatchT m b #

return :: a -> CatchT m a #

Alternative f => Monad (Cofree f) 
Instance details

Defined in Control.Comonad.Cofree

Methods

(>>=) :: Cofree f a -> (a -> Cofree f b) -> Cofree f b #

(>>) :: Cofree f a -> Cofree f b -> Cofree f b #

return :: a -> Cofree f a #

Functor f => Monad (Free f) 
Instance details

Defined in Control.Monad.Free

Methods

(>>=) :: Free f a -> (a -> Free f b) -> Free f b #

(>>) :: Free f a -> Free f b -> Free f b #

return :: a -> Free f a #

Monad m => Monad (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 #

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 #

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 #

Monad m => Monad (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

(>>=) :: LoggingT m a -> (a -> LoggingT m b) -> LoggingT m b #

(>>) :: LoggingT m a -> LoggingT m b -> LoggingT m b #

return :: a -> LoggingT m a #

Monad m => Monad (NoLoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

(>>=) :: NoLoggingT m a -> (a -> NoLoggingT m b) -> NoLoggingT m b #

(>>) :: NoLoggingT m a -> NoLoggingT m b -> NoLoggingT m b #

return :: a -> NoLoggingT m a #

Monad m => Monad (WriterLoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

(>>=) :: WriterLoggingT m a -> (a -> WriterLoggingT m b) -> WriterLoggingT m b #

(>>) :: WriterLoggingT m a -> WriterLoggingT m b -> WriterLoggingT m b #

return :: a -> WriterLoggingT m a #

Monad f => Monad (WrappedPoly f) 
Instance details

Defined in Data.MonoTraversable

Methods

(>>=) :: WrappedPoly f a -> (a -> WrappedPoly f b) -> WrappedPoly f b #

(>>) :: WrappedPoly f a -> WrappedPoly f b -> WrappedPoly f b #

return :: a -> WrappedPoly f a #

Monad m => Monad (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

(>>=) :: ResourceT m a -> (a -> ResourceT m b) -> ResourceT m b #

(>>) :: ResourceT m a -> ResourceT m b -> ResourceT m b #

return :: a -> ResourceT m a #

Semigroup a => Monad (These a) 
Instance details

Defined in Data.Strict.These

Methods

(>>=) :: These a a0 -> (a0 -> These a b) -> These a b #

(>>) :: These a a0 -> These a b -> These a b #

return :: a0 -> These a a0 #

Semigroup a => Monad (These a) 
Instance details

Defined in Data.These

Methods

(>>=) :: These a a0 -> (a0 -> These a b) -> These a b #

(>>) :: These a a0 -> These a b -> These a b #

return :: a0 -> These a a0 #

Monad m => Monad (ListT m) 
Instance details

Defined in Control.Monad.Trans.List

Methods

(>>=) :: ListT m a -> (a -> ListT m b) -> ListT m b #

(>>) :: ListT m a -> ListT m b -> ListT m b #

return :: a -> ListT m a #

Monad m => Monad (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

(>>=) :: MaybeT m a -> (a -> MaybeT m b) -> MaybeT m b #

(>>) :: MaybeT m a -> MaybeT m b -> MaybeT m b #

return :: a -> MaybeT m a #

Monad (HandlerFor site) 
Instance details

Defined in Yesod.Core.Types

Methods

(>>=) :: HandlerFor site a -> (a -> HandlerFor site b) -> HandlerFor site b #

(>>) :: HandlerFor site a -> HandlerFor site b -> HandlerFor site b #

return :: a -> HandlerFor site a #

Monad (WidgetFor site) 
Instance details

Defined in Yesod.Core.Types

Methods

(>>=) :: WidgetFor site a -> (a -> WidgetFor site b) -> WidgetFor site b #

(>>) :: WidgetFor site a -> WidgetFor site b -> WidgetFor site b #

return :: a -> WidgetFor site a #

Monoid a => Monad ((,) a)

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

(>>=) :: (a, a0) -> (a0 -> (a, b)) -> (a, b) #

(>>) :: (a, a0) -> (a, b) -> (a, b) #

return :: a0 -> (a, a0) #

Monad m => Monad (Kleisli m a)

Since: base-4.14.0.0

Instance details

Defined in Control.Arrow

Methods

(>>=) :: Kleisli m a a0 -> (a0 -> Kleisli m a b) -> Kleisli m a b #

(>>) :: Kleisli m a a0 -> Kleisli m a b -> Kleisli m a b #

return :: a0 -> Kleisli m a a0 #

Monad f => Monad (Ap f)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

(>>=) :: Ap f a -> (a -> Ap f b) -> Ap f b #

(>>) :: Ap f a -> Ap f b -> Ap f b #

return :: a -> Ap f a #

Monad f => Monad (Alt f)

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

(>>=) :: Alt f a -> (a -> Alt f b) -> Alt f b #

(>>) :: Alt f a -> Alt f b -> Alt f b #

return :: a -> Alt f a #

Monad f => Monad (Rec1 f)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

(>>=) :: Rec1 f a -> (a -> Rec1 f b) -> Rec1 f b #

(>>) :: Rec1 f a -> Rec1 f b -> Rec1 f b #

return :: a -> Rec1 f a #

(Applicative f, Monad f) => Monad (WhenMissing f x)

Equivalent to ReaderT k (ReaderT x (MaybeT f)).

Since: containers-0.5.9

Instance details

Defined in Data.IntMap.Internal

Methods

(>>=) :: WhenMissing f x a -> (a -> WhenMissing f x b) -> WhenMissing f x b #

(>>) :: WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x b #

return :: a -> WhenMissing f x a #

Monad m => Monad (ExceptRT r m) 
Instance details

Defined in Data.EitherR

Methods

(>>=) :: ExceptRT r m a -> (a -> ExceptRT r m b) -> ExceptRT r m b #

(>>) :: ExceptRT r m a -> ExceptRT r m b -> ExceptRT r m b #

return :: a -> ExceptRT r m a #

(Functor f, Monad m) => Monad (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

(>>=) :: FreeT f m a -> (a -> FreeT f m b) -> FreeT f m b #

(>>) :: FreeT f m a -> FreeT f m b -> FreeT f m b #

return :: a -> FreeT f m a #

Monad m => Monad (StateT s m) 
Instance details

Defined in Lens.Micro

Methods

(>>=) :: StateT s m a -> (a -> StateT s m b) -> StateT s m b #

(>>) :: StateT s m a -> StateT s m b -> StateT s m b #

return :: a -> StateT s m a #

(Monad (Rep p), Representable p) => Monad (Prep p) 
Instance details

Defined in Data.Profunctor.Rep

Methods

(>>=) :: Prep p a -> (a -> Prep p b) -> Prep p b #

(>>) :: Prep p a -> Prep p b -> Prep p b #

return :: a -> Prep p a #

Monad (Tagged s) 
Instance details

Defined in Data.Tagged

Methods

(>>=) :: Tagged s a -> (a -> Tagged s b) -> Tagged s b #

(>>) :: Tagged s a -> Tagged s b -> Tagged s b #

return :: a -> Tagged s a #

(Monoid w, Functor m, Monad m) => Monad (AccumT w m) 
Instance details

Defined in Control.Monad.Trans.Accum

Methods

(>>=) :: AccumT w m a -> (a -> AccumT w m b) -> AccumT w m b #

(>>) :: AccumT w m a -> AccumT w m b -> AccumT w m b #

return :: a -> AccumT w m a #

(Monad m, Error e) => Monad (ErrorT e m) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

(>>=) :: ErrorT e m a -> (a -> ErrorT e m b) -> ErrorT e m b #

(>>) :: ErrorT e m a -> ErrorT e m b -> ErrorT e m b #

return :: a -> ErrorT e m a #

Monad m => Monad (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

(>>=) :: ExceptT e m a -> (a -> ExceptT e m b) -> ExceptT e m b #

(>>) :: ExceptT e m a -> ExceptT e m b -> ExceptT e m b #

return :: a -> ExceptT e m a #

Monad m => Monad (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

(>>=) :: IdentityT m a -> (a -> IdentityT m b) -> IdentityT m b #

(>>) :: IdentityT m a -> IdentityT m b -> IdentityT m b #

return :: a -> IdentityT m a #

Monad m => Monad (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

(>>=) :: ReaderT r m a -> (a -> ReaderT r m b) -> ReaderT r m b #

(>>) :: ReaderT r m a -> ReaderT r m b -> ReaderT r m b #

return :: a -> ReaderT r m a #

Monad m => Monad (SelectT r m) 
Instance details

Defined in Control.Monad.Trans.Select

Methods

(>>=) :: SelectT r m a -> (a -> SelectT r m b) -> SelectT r m b #

(>>) :: SelectT r m a -> SelectT r m b -> SelectT r m b #

return :: a -> SelectT r m a #

Monad m => Monad (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Lazy

Methods

(>>=) :: StateT s m a -> (a -> StateT s m b) -> StateT s m b #

(>>) :: StateT s m a -> StateT s m b -> StateT s m b #

return :: a -> StateT s m a #

Monad m => Monad (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

(>>=) :: StateT s m a -> (a -> StateT s m b) -> StateT s m b #

(>>) :: StateT s m a -> StateT s m b -> StateT s m b #

return :: a -> StateT s m a #

Monad m => Monad (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.CPS

Methods

(>>=) :: WriterT w m a -> (a -> WriterT w m b) -> WriterT w m b #

(>>) :: WriterT w m a -> WriterT w m b -> WriterT w m b #

return :: a -> WriterT w m a #

(Monoid w, Monad m) => Monad (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

(>>=) :: WriterT w m a -> (a -> WriterT w m b) -> WriterT w m b #

(>>) :: WriterT w m a -> WriterT w m b -> WriterT w m b #

return :: a -> WriterT w m a #

(Monoid w, Monad m) => Monad (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

(>>=) :: WriterT w m a -> (a -> WriterT w m b) -> WriterT w m b #

(>>) :: WriterT w m a -> WriterT w m b -> WriterT w m b #

return :: a -> WriterT w m a #

Monad m => Monad (Reverse m)

Derived instance.

Instance details

Defined in Data.Functor.Reverse

Methods

(>>=) :: Reverse m a -> (a -> Reverse m b) -> Reverse m b #

(>>) :: Reverse m a -> Reverse m b -> Reverse m b #

return :: a -> Reverse m a #

Monad (SubHandlerFor child master) 
Instance details

Defined in Yesod.Core.Types

Methods

(>>=) :: SubHandlerFor child master a -> (a -> SubHandlerFor child master b) -> SubHandlerFor child master b #

(>>) :: SubHandlerFor child master a -> SubHandlerFor child master b -> SubHandlerFor child master b #

return :: a -> SubHandlerFor child master a #

(Monoid a, Monoid b) => Monad ((,,) a b)

Since: base-4.14.0.0

Instance details

Defined in GHC.Base

Methods

(>>=) :: (a, b, a0) -> (a0 -> (a, b, b0)) -> (a, b, b0) #

(>>) :: (a, b, a0) -> (a, b, b0) -> (a, b, b0) #

return :: a0 -> (a, b, a0) #

(Monad f, Monad g) => Monad (Product f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Product

Methods

(>>=) :: Product f g a -> (a -> Product f g b) -> Product f g b #

(>>) :: Product f g a -> Product f g b -> Product f g b #

return :: a -> Product f g a #

(Monad f, Monad g) => Monad (f :*: g)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

(>>=) :: (f :*: g) a -> (a -> (f :*: g) b) -> (f :*: g) b #

(>>) :: (f :*: g) a -> (f :*: g) b -> (f :*: g) b #

return :: a -> (f :*: g) a #

Monad (Cokleisli w a) 
Instance details

Defined in Control.Comonad

Methods

(>>=) :: Cokleisli w a a0 -> (a0 -> Cokleisli w a b) -> Cokleisli w a b #

(>>) :: Cokleisli w a a0 -> Cokleisli w a b -> Cokleisli w a b #

return :: a0 -> Cokleisli w a a0 #

Monad (ConduitT i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

(>>=) :: ConduitT i o m a -> (a -> ConduitT i o m b) -> ConduitT i o m b #

(>>) :: ConduitT i o m a -> ConduitT i o m b -> ConduitT i o m b #

return :: a -> ConduitT i o m a #

(Monad f, Applicative f) => Monad (WhenMatched f x y)

Equivalent to ReaderT Key (ReaderT x (ReaderT y (MaybeT f)))

Since: containers-0.5.9

Instance details

Defined in Data.IntMap.Internal

Methods

(>>=) :: WhenMatched f x y a -> (a -> WhenMatched f x y b) -> WhenMatched f x y b #

(>>) :: WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y b #

return :: a -> WhenMatched f x y a #

(Applicative f, Monad f) => Monad (WhenMissing f k x)

Equivalent to ReaderT k (ReaderT x (MaybeT f)) .

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

(>>=) :: WhenMissing f k x a -> (a -> WhenMissing f k x b) -> WhenMissing f k x b #

(>>) :: WhenMissing f k x a -> WhenMissing f k x b -> WhenMissing f k x b #

return :: a -> WhenMissing f k x a #

Monad (ContT r m) 
Instance details

Defined in Control.Monad.Trans.Cont

Methods

(>>=) :: ContT r m a -> (a -> ContT r m b) -> ContT r m b #

(>>) :: ContT r m a -> ContT r m b -> ContT r m b #

return :: a -> ContT r m a #

(Monoid a, Monoid b, Monoid c) => Monad ((,,,) a b c)

Since: base-4.14.0.0

Instance details

Defined in GHC.Base

Methods

(>>=) :: (a, b, c, a0) -> (a0 -> (a, b, c, b0)) -> (a, b, c, b0) #

(>>) :: (a, b, c, a0) -> (a, b, c, b0) -> (a, b, c, b0) #

return :: a0 -> (a, b, c, a0) #

Monad ((->) r)

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

(>>=) :: (r -> a) -> (a -> r -> b) -> r -> b #

(>>) :: (r -> a) -> (r -> b) -> r -> b #

return :: a -> r -> a #

Monad f => Monad (M1 i c f)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

(>>=) :: M1 i c f a -> (a -> M1 i c f b) -> M1 i c f b #

(>>) :: M1 i c f a -> M1 i c f b -> M1 i c f b #

return :: a -> M1 i c f a #

(Monad f, Applicative f) => Monad (WhenMatched f k x y)

Equivalent to ReaderT k (ReaderT x (ReaderT y (MaybeT f)))

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

(>>=) :: WhenMatched f k x y a -> (a -> WhenMatched f k x y b) -> WhenMatched f k x y b #

(>>) :: WhenMatched f k x y a -> WhenMatched f k x y b -> WhenMatched f k x y b #

return :: a -> WhenMatched f k x y a #

Monad m => Monad (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.CPS

Methods

(>>=) :: RWST r w s m a -> (a -> RWST r w s m b) -> RWST r w s m b #

(>>) :: RWST r w s m a -> RWST r w s m b -> RWST r w s m b #

return :: a -> RWST r w s m a #

(Monoid w, Monad m) => Monad (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.Lazy

Methods

(>>=) :: RWST r w s m a -> (a -> RWST r w s m b) -> RWST r w s m b #

(>>) :: RWST r w s m a -> RWST r w s m b -> RWST r w s m b #

return :: a -> RWST r w s m a #

(Monoid w, Monad m) => Monad (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.Strict

Methods

(>>=) :: RWST r w s m a -> (a -> RWST r w s m b) -> RWST r w s m b #

(>>) :: RWST r w s m a -> RWST r w s m b -> RWST r w s m b #

return :: a -> RWST r w s m a #

Monad state => Monad (Builder collection mutCollection step state err) 
Instance details

Defined in Basement.MutableBuilder

Methods

(>>=) :: Builder collection mutCollection step state err a -> (a -> Builder collection mutCollection step state err b) -> Builder collection mutCollection step state err b #

(>>) :: Builder collection mutCollection step state err a -> Builder collection mutCollection step state err b -> Builder collection mutCollection step state err b #

return :: a -> Builder collection mutCollection step state err a #

Monad m => Monad (Pipe l i o u m) 
Instance details

Defined in Data.Conduit.Internal.Pipe

Methods

(>>=) :: Pipe l i o u m a -> (a -> Pipe l i o u m b) -> Pipe l i o u m b #

(>>) :: Pipe l i o u m a -> Pipe l i o u m b -> Pipe l i o u m b #

return :: a -> Pipe l i o u m a #

class Functor (f :: Type -> Type) where #

A type f is a Functor if it provides a function fmap which, given any types a and b lets you apply any function from (a -> b) to turn an f a into an f b, preserving the structure of f. Furthermore f needs to adhere to the following:

Identity
fmap id == id
Composition
fmap (f . g) == fmap f . fmap g

Note, that the second law follows from the free theorem of the type fmap and the first law, so you need only check that the former condition holds.

Minimal complete definition

fmap

Methods

fmap :: (a -> b) -> f a -> f b #

fmap is used to apply a function of type (a -> b) to a value of type f a, where f is a functor, to produce a value of type f b. Note that for any type constructor with more than one parameter (e.g., Either), only the last type parameter can be modified with fmap (e.g., b in `Either a b`).

Some type constructors with two parameters or more have a Bifunctor instance that allows both the last and the penultimate parameters to be mapped over. ==== Examples

Convert from a Maybe Int to a Maybe String using show:

>>> fmap show Nothing
Nothing
>>> fmap show (Just 3)
Just "3"

Convert from an Either Int Int to an Either Int String using show:

>>> fmap show (Left 17)
Left 17
>>> fmap show (Right 17)
Right "17"

Double each element of a list:

>>> fmap (*2) [1,2,3]
[2,4,6]

Apply even to the second element of a pair:

>>> fmap even (2,2)
(2,True)

It may seem surprising that the function is only applied to the last element of the tuple compared to the list example above which applies it to every element in the list. To understand, remember that tuples are type constructors with multiple type parameters: a tuple of 3 elements `(a,b,c)` can also be written `(,,) a b c` and its Functor instance is defined for `Functor ((,,) a b)` (i.e., only the third parameter is free to be mapped over with fmap).

It explains why fmap can be used with tuples containing values of different types as in the following example:

>>> fmap even ("hello", 1.0, 4)
("hello",1.0,True)

(<$) :: a -> f b -> f a infixl 4 #

Replace all locations in the input with the same value. The default definition is fmap . const, but this may be overridden with a more efficient version.

Instances

Instances details
Functor Only 
Instance details

Defined in Data.Tuple.Only

Methods

fmap :: (a -> b) -> Only a -> Only b #

(<$) :: a -> Only b -> Only a #

Functor FromJSONKeyFunction

Only law abiding up to interpretation

Instance details

Defined in Data.Aeson.Types.FromJSON

Functor IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fmap :: (a -> b) -> IResult a -> IResult b #

(<$) :: a -> IResult b -> IResult a #

Functor Parser 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fmap :: (a -> b) -> Parser a -> Parser b #

(<$) :: a -> Parser b -> Parser a #

Functor Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fmap :: (a -> b) -> Result a -> Result b #

(<$) :: a -> Result b -> Result a #

Functor Async 
Instance details

Defined in Control.Concurrent.Async

Methods

fmap :: (a -> b) -> Async a -> Async b #

(<$) :: a -> Async b -> Async a #

Functor Concurrently 
Instance details

Defined in Control.Concurrent.Async

Methods

fmap :: (a -> b) -> Concurrently a -> Concurrently b #

(<$) :: a -> Concurrently b -> Concurrently a #

Functor ZipList

Since: base-2.1

Instance details

Defined in Control.Applicative

Methods

fmap :: (a -> b) -> ZipList a -> ZipList b #

(<$) :: a -> ZipList b -> ZipList a #

Functor Handler

Since: base-4.6.0.0

Instance details

Defined in Control.Exception

Methods

fmap :: (a -> b) -> Handler a -> Handler b #

(<$) :: a -> Handler b -> Handler a #

Functor Complex

Since: base-4.9.0.0

Instance details

Defined in Data.Complex

Methods

fmap :: (a -> b) -> Complex a -> Complex b #

(<$) :: a -> Complex b -> Complex a #

Functor Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

fmap :: (a -> b) -> Identity a -> Identity b #

(<$) :: a -> Identity b -> Identity a #

Functor First

Since: base-4.8.0.0

Instance details

Defined in Data.Monoid

Methods

fmap :: (a -> b) -> First a -> First b #

(<$) :: a -> First b -> First a #

Functor Last

Since: base-4.8.0.0

Instance details

Defined in Data.Monoid

Methods

fmap :: (a -> b) -> Last a -> Last b #

(<$) :: a -> Last b -> Last a #

Functor Down

Since: base-4.11.0.0

Instance details

Defined in Data.Ord

Methods

fmap :: (a -> b) -> Down a -> Down b #

(<$) :: a -> Down b -> Down a #

Functor First

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

fmap :: (a -> b) -> First a -> First b #

(<$) :: a -> First b -> First a #

Functor Last

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

fmap :: (a -> b) -> Last a -> Last b #

(<$) :: a -> Last b -> Last a #

Functor Max

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

fmap :: (a -> b) -> Max a -> Max b #

(<$) :: a -> Max b -> Max a #

Functor Min

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

fmap :: (a -> b) -> Min a -> Min b #

(<$) :: a -> Min b -> Min a #

Functor 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 Dual

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

fmap :: (a -> b) -> Dual a -> Dual b #

(<$) :: a -> Dual b -> Dual a #

Functor Product

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

fmap :: (a -> b) -> Product a -> Product b #

(<$) :: a -> Product b -> Product a #

Functor Sum

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

fmap :: (a -> b) -> Sum a -> Sum b #

(<$) :: a -> Sum b -> Sum a #

Functor 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 STM

Since: base-4.3.0.0

Instance details

Defined in GHC.Conc.Sync

Methods

fmap :: (a -> b) -> STM a -> STM b #

(<$) :: a -> STM b -> STM a #

Functor Par1

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> Par1 a -> Par1 b #

(<$) :: a -> Par1 b -> Par1 a #

Functor P

Since: base-4.8.0.0

Instance details

Defined in Text.ParserCombinators.ReadP

Methods

fmap :: (a -> b) -> P a -> P b #

(<$) :: a -> P b -> P a #

Functor ReadP

Since: base-2.1

Instance details

Defined in Text.ParserCombinators.ReadP

Methods

fmap :: (a -> b) -> ReadP a -> ReadP b #

(<$) :: a -> ReadP b -> ReadP a #

Functor 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 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 MarkupM 
Instance details

Defined in Text.Blaze.Internal

Methods

fmap :: (a -> b) -> MarkupM a -> MarkupM b #

(<$) :: a -> MarkupM b -> MarkupM 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 Identifier 
Instance details

Defined in Text.Casing

Methods

fmap :: (a -> b) -> Identifier a -> Identifier b #

(<$) :: a -> Identifier b -> Identifier 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 IntMap 
Instance details

Defined in Data.IntMap.Internal

Methods

fmap :: (a -> b) -> IntMap a -> IntMap b #

(<$) :: a -> IntMap b -> IntMap a #

Functor Digit 
Instance details

Defined in Data.Sequence.Internal

Methods

fmap :: (a -> b) -> Digit a -> Digit b #

(<$) :: a -> Digit b -> Digit a #

Functor Elem 
Instance details

Defined in Data.Sequence.Internal

Methods

fmap :: (a -> b) -> Elem a -> Elem b #

(<$) :: a -> Elem b -> Elem a #

Functor FingerTree 
Instance details

Defined in Data.Sequence.Internal

Methods

fmap :: (a -> b) -> FingerTree a -> FingerTree b #

(<$) :: a -> FingerTree b -> FingerTree a #

Functor Node 
Instance details

Defined in Data.Sequence.Internal

Methods

fmap :: (a -> b) -> Node a -> Node b #

(<$) :: a -> Node b -> Node a #

Functor Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

fmap :: (a -> b) -> Seq a -> Seq b #

(<$) :: a -> Seq b -> Seq a #

Functor ViewL 
Instance details

Defined in Data.Sequence.Internal

Methods

fmap :: (a -> b) -> ViewL a -> ViewL b #

(<$) :: a -> ViewL b -> ViewL a #

Functor ViewR 
Instance details

Defined in Data.Sequence.Internal

Methods

fmap :: (a -> b) -> ViewR a -> ViewR b #

(<$) :: a -> ViewR b -> ViewR a #

Functor Tree 
Instance details

Defined in Data.Tree

Methods

fmap :: (a -> b) -> Tree a -> Tree b #

(<$) :: a -> Tree b -> Tree a #

Functor CryptoFailable 
Instance details

Defined in Crypto.Error.Types

Methods

fmap :: (a -> b) -> CryptoFailable a -> CryptoFailable b #

(<$) :: a -> CryptoFailable b -> CryptoFailable a #

Functor DNonEmpty 
Instance details

Defined in Data.DList.DNonEmpty.Internal

Methods

fmap :: (a -> b) -> DNonEmpty a -> DNonEmpty b #

(<$) :: a -> DNonEmpty b -> DNonEmpty a #

Functor DList 
Instance details

Defined in Data.DList.Internal

Methods

fmap :: (a -> b) -> DList a -> DList b #

(<$) :: a -> DList b -> DList a #

Functor SqlQuery 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Methods

fmap :: (a -> b) -> SqlQuery a -> SqlQuery b #

(<$) :: a -> SqlQuery b -> SqlQuery a #

Functor Value

Since: esqueleto-1.4.4

Instance details

Defined in Database.Esqueleto.Internal.Internal

Methods

fmap :: (a -> b) -> Value a -> Value b #

(<$) :: a -> Value b -> Value 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 LenientData 
Instance details

Defined in Web.Internal.HttpApiData

Methods

fmap :: (a -> b) -> LenientData a -> LenientData b #

(<$) :: a -> LenientData b -> LenientData a #

Functor HistoriedResponse 
Instance details

Defined in Network.HTTP.Client

Functor Response 
Instance details

Defined in Network.HTTP.Client.Types

Methods

fmap :: (a -> b) -> Response a -> Response b #

(<$) :: a -> Response b -> Response a #

Functor Item 
Instance details

Defined in Katip.Core

Methods

fmap :: (a -> b) -> Item a -> Item b #

(<$) :: a -> Item b -> Item a #

Functor Conversion 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Methods

fmap :: (a -> b) -> Conversion a -> Conversion b #

(<$) :: a -> Conversion b -> Conversion a #

Functor RowParser 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Methods

fmap :: (a -> b) -> RowParser a -> RowParser b #

(<$) :: a -> RowParser b -> RowParser a #

Functor AnnotDetails 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

fmap :: (a -> b) -> AnnotDetails a -> AnnotDetails b #

(<$) :: a -> AnnotDetails b -> AnnotDetails a #

Functor Doc 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

fmap :: (a -> b) -> Doc a -> Doc b #

(<$) :: a -> Doc b -> Doc a #

Functor Span 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

fmap :: (a -> b) -> Span a -> Span b #

(<$) :: a -> Span b -> Span a #

Functor Doc

Alter the document’s annotations.

This instance makes Doc more flexible (because it can be used in Functor-polymorphic values), but fmap is much less readable compared to using reAnnotate in code that only works for Doc anyway. Consider using the latter when the type does not matter.

Instance details

Defined in Prettyprinter.Internal

Methods

fmap :: (a -> b) -> Doc a -> Doc b #

(<$) :: a -> Doc b -> Doc a #

Functor FlattenResult 
Instance details

Defined in Prettyprinter.Internal

Methods

fmap :: (a -> b) -> FlattenResult a -> FlattenResult b #

(<$) :: a -> FlattenResult b -> FlattenResult a #

Functor SimpleDocStream

Alter the document’s annotations.

This instance makes SimpleDocStream more flexible (because it can be used in Functor-polymorphic values), but fmap is much less readable compared to using reAnnotateST in code that only works for SimpleDocStream anyway. Consider using the latter when the type does not matter.

Instance details

Defined in Prettyprinter.Internal

Methods

fmap :: (a -> b) -> SimpleDocStream a -> SimpleDocStream b #

(<$) :: a -> SimpleDocStream b -> SimpleDocStream a #

Functor Array 
Instance details

Defined in Data.Primitive.Array

Methods

fmap :: (a -> b) -> Array a -> Array b #

(<$) :: a -> Array b -> Array a #

Functor SmallArray 
Instance details

Defined in Data.Primitive.SmallArray

Methods

fmap :: (a -> b) -> SmallArray a -> SmallArray b #

(<$) :: a -> SmallArray b -> SmallArray a #

Functor ParseResult 
Instance details

Defined in Data.ProtoLens.Encoding.Parser.Internal

Methods

fmap :: (a -> b) -> ParseResult a -> ParseResult b #

(<$) :: a -> ParseResult b -> ParseResult 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 Acquire 
Instance details

Defined in Data.Acquire.Internal

Methods

fmap :: (a -> b) -> Acquire a -> Acquire b #

(<$) :: a -> Acquire b -> Acquire a #

Functor Result 
Instance details

Defined in Text.Hamlet.Parse

Methods

fmap :: (a -> b) -> Result a -> Result b #

(<$) :: a -> Result b -> Result a #

Functor Maybe 
Instance details

Defined in Data.Strict.Maybe

Methods

fmap :: (a -> b) -> Maybe a -> Maybe b #

(<$) :: a -> Maybe b -> Maybe a #

Functor Q 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

fmap :: (a -> b) -> Q a -> Q b #

(<$) :: a -> Q b -> Q a #

Functor TyVarBndr 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

fmap :: (a -> b) -> TyVarBndr a -> TyVarBndr b #

(<$) :: a -> TyVarBndr b -> TyVarBndr a #

Functor Flat 
Instance details

Defined in UnliftIO.Internals.Async

Methods

fmap :: (a -> b) -> Flat a -> Flat b #

(<$) :: a -> Flat b -> Flat a #

Functor FlatApp 
Instance details

Defined in UnliftIO.Internals.Async

Methods

fmap :: (a -> b) -> FlatApp a -> FlatApp b #

(<$) :: a -> FlatApp b -> FlatApp a #

Functor Memoized 
Instance details

Defined in UnliftIO.Memoize

Methods

fmap :: (a -> b) -> Memoized a -> Memoized b #

(<$) :: a -> Memoized b -> Memoized a #

Functor Vector 
Instance details

Defined in Data.Vector

Methods

fmap :: (a -> b) -> Vector a -> Vector b #

(<$) :: a -> Vector b -> Vector a #

Functor Box 
Instance details

Defined in Data.Vector.Fusion.Util

Methods

fmap :: (a -> b) -> Box a -> Box b #

(<$) :: a -> Box b -> Box 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 Dispatch 
Instance details

Defined in Yesod.Routes.TH.Types

Methods

fmap :: (a -> b) -> Dispatch a -> Dispatch b #

(<$) :: a -> Dispatch b -> Dispatch a #

Functor Piece 
Instance details

Defined in Yesod.Routes.TH.Types

Methods

fmap :: (a -> b) -> Piece a -> Piece b #

(<$) :: a -> Piece b -> Piece a #

Functor Resource 
Instance details

Defined in Yesod.Routes.TH.Types

Methods

fmap :: (a -> b) -> Resource a -> Resource b #

(<$) :: a -> Resource b -> Resource a #

Functor ResourceTree 
Instance details

Defined in Yesod.Routes.TH.Types

Methods

fmap :: (a -> b) -> ResourceTree a -> ResourceTree b #

(<$) :: a -> ResourceTree b -> ResourceTree a #

Functor Option

Since 1.4.6

Instance details

Defined in Yesod.Form.Fields

Methods

fmap :: (a -> b) -> Option a -> Option b #

(<$) :: a -> Option b -> Option a #

Functor OptionList

Since 1.4.6

Instance details

Defined in Yesod.Form.Fields

Methods

fmap :: (a -> b) -> OptionList a -> OptionList b #

(<$) :: a -> OptionList b -> OptionList a #

Functor FormResult 
Instance details

Defined in Yesod.Form.Types

Methods

fmap :: (a -> b) -> FormResult a -> FormResult b #

(<$) :: a -> FormResult b -> FormResult 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 Maybe

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

fmap :: (a -> b) -> Maybe a -> Maybe b #

(<$) :: a -> Maybe b -> Maybe a #

Functor Solo

Since: base-4.15

Instance details

Defined in GHC.Base

Methods

fmap :: (a -> b) -> Solo a -> Solo b #

(<$) :: a -> Solo b -> Solo a #

Functor []

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

fmap :: (a -> b) -> [a] -> [b] #

(<$) :: a -> [b] -> [a] #

Functor f => Functor (Co f) 
Instance details

Defined in Data.Functor.Rep

Methods

fmap :: (a -> b) -> Co f a -> Co f b #

(<$) :: a -> Co f b -> Co f a #

Functor (Tagged2 s) 
Instance details

Defined in Data.Aeson.Types.Generic

Methods

fmap :: (a -> b) -> Tagged2 s a -> Tagged2 s b #

(<$) :: a -> Tagged2 s b -> Tagged2 s a #

Functor (IResult i) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

fmap :: (a -> b) -> IResult i a -> IResult i b #

(<$) :: a -> IResult i b -> IResult i a #

Functor (Parser i) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

fmap :: (a -> b) -> Parser i a -> Parser i b #

(<$) :: a -> Parser i b -> Parser i a #

Monad m => Functor (WrappedMonad m)

Since: base-2.1

Instance details

Defined in Control.Applicative

Methods

fmap :: (a -> b) -> WrappedMonad m a -> WrappedMonad m b #

(<$) :: a -> WrappedMonad m b -> WrappedMonad m a #

Arrow a => Functor (ArrowMonad a)

Since: base-4.6.0.0

Instance details

Defined in Control.Arrow

Methods

fmap :: (a0 -> b) -> ArrowMonad a a0 -> ArrowMonad a b #

(<$) :: a0 -> ArrowMonad a b -> ArrowMonad a a0 #

Functor (ST s)

Since: base-2.1

Instance details

Defined in Control.Monad.ST.Lazy.Imp

Methods

fmap :: (a -> b) -> ST s a -> ST s b #

(<$) :: a -> ST s b -> ST s 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 (Proxy :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

fmap :: (a -> b) -> Proxy a -> Proxy b #

(<$) :: a -> Proxy b -> Proxy a #

Functor (Arg a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

fmap :: (a0 -> b) -> Arg a a0 -> Arg a b #

(<$) :: a0 -> Arg a b -> Arg a a0 #

Functor (U1 :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> U1 a -> U1 b #

(<$) :: a -> U1 b -> U1 a #

Functor (V1 :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> V1 a -> V1 b #

(<$) :: a -> V1 b -> V1 a #

Functor (ST s)

Since: base-2.1

Instance details

Defined in GHC.ST

Methods

fmap :: (a -> b) -> ST s a -> ST s b #

(<$) :: a -> ST s b -> ST s a #

Functor m => Functor (AppM m) Source # 
Instance details

Defined in BtcLsp.Data.AppM

Methods

fmap :: (a -> b) -> AppM m a -> AppM m b #

(<$) :: a -> AppM m b -> AppM 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 (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 #

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 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 (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 (Parser e) 
Instance details

Defined in Env.Internal.Parser

Methods

fmap :: (a -> b) -> Parser e a -> Parser e b #

(<$) :: a -> Parser e b -> Parser e a #

Functor (VarF e) 
Instance details

Defined in Env.Internal.Parser

Methods

fmap :: (a -> b) -> VarF e a -> VarF e b #

(<$) :: a -> VarF e b -> VarF e a #

Functor (EitherR r) 
Instance details

Defined in Data.EitherR

Methods

fmap :: (a -> b) -> EitherR r a -> EitherR r b #

(<$) :: a -> EitherR r b -> EitherR r 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 #

Monad m => Functor (CatchT m) 
Instance details

Defined in Control.Monad.Catch.Pure

Methods

fmap :: (a -> b) -> CatchT m a -> CatchT m b #

(<$) :: a -> CatchT m b -> CatchT m a #

Functor f => Functor (Cofree f) 
Instance details

Defined in Control.Comonad.Cofree

Methods

fmap :: (a -> b) -> Cofree f a -> Cofree f b #

(<$) :: a -> Cofree f b -> Cofree f a #

Functor f => Functor (Free f) 
Instance details

Defined in Control.Monad.Free

Methods

fmap :: (a -> b) -> Free f a -> Free f b #

(<$) :: a -> Free f b -> Free f a #

Functor 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 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 #

Functor f => Functor (Act f) 
Instance details

Defined in Data.Key

Methods

fmap :: (a -> b) -> Act f a -> Act f b #

(<$) :: a -> Act f b -> Act f a #

Functor (StateL s) 
Instance details

Defined in Data.Key

Methods

fmap :: (a -> b) -> StateL s a -> StateL s b #

(<$) :: a -> StateL s b -> StateL s a #

Functor (StateR s) 
Instance details

Defined in Data.Key

Methods

fmap :: (a -> b) -> StateR s a -> StateR s b #

(<$) :: a -> StateR s b -> StateR s a #

Functor m => Functor (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

fmap :: (a -> b) -> LoggingT m a -> LoggingT m b #

(<$) :: a -> LoggingT m b -> LoggingT m a #

Functor m => Functor (NoLoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

fmap :: (a -> b) -> NoLoggingT m a -> NoLoggingT m b #

(<$) :: a -> NoLoggingT m b -> NoLoggingT m a #

Functor m => Functor (WriterLoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

fmap :: (a -> b) -> WriterLoggingT m a -> WriterLoggingT m b #

(<$) :: a -> WriterLoggingT m b -> WriterLoggingT m a #

Functor f => Functor (WrappedPoly f) 
Instance details

Defined in Data.MonoTraversable

Methods

fmap :: (a -> b) -> WrappedPoly f a -> WrappedPoly f b #

(<$) :: a -> WrappedPoly f b -> WrappedPoly f a #

Functor m => Functor (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

fmap :: (a -> b) -> ResourceT m a -> ResourceT m b #

(<$) :: a -> ResourceT m b -> ResourceT m a #

Functor f => Functor (MaybeApply f) 
Instance details

Defined in Data.Functor.Bind.Class

Methods

fmap :: (a -> b) -> MaybeApply f a -> MaybeApply f b #

(<$) :: a -> MaybeApply f b -> MaybeApply f a #

Functor f => Functor (WrappedApplicative f) 
Instance details

Defined in Data.Functor.Bind.Class

Methods

fmap :: (a -> b) -> WrappedApplicative f a -> WrappedApplicative f b #

(<$) :: a -> WrappedApplicative f b -> WrappedApplicative f a #

Functor (Either a) 
Instance details

Defined in Data.Strict.Either

Methods

fmap :: (a0 -> b) -> Either a a0 -> Either a b #

(<$) :: a0 -> Either a b -> Either a a0 #

Functor (These a) 
Instance details

Defined in Data.Strict.These

Methods

fmap :: (a0 -> b) -> These a a0 -> These a b #

(<$) :: a0 -> These a b -> These a a0 #

Functor (Pair e) 
Instance details

Defined in Data.Strict.Tuple

Methods

fmap :: (a -> b) -> Pair e a -> Pair e b #

(<$) :: a -> Pair e b -> Pair e a #

Functor (These a) 
Instance details

Defined in Data.These

Methods

fmap :: (a0 -> b) -> These a a0 -> These a b #

(<$) :: a0 -> These a b -> These a a0 #

Functor f => Functor (Lift f) 
Instance details

Defined in Control.Applicative.Lift

Methods

fmap :: (a -> b) -> Lift f a -> Lift f b #

(<$) :: a -> Lift f b -> Lift f a #

Functor m => Functor (ListT m) 
Instance details

Defined in Control.Monad.Trans.List

Methods

fmap :: (a -> b) -> ListT m a -> ListT m b #

(<$) :: a -> ListT m b -> ListT m a #

Functor m => Functor (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

fmap :: (a -> b) -> MaybeT m a -> MaybeT m b #

(<$) :: a -> MaybeT m b -> MaybeT m a #

Functor m => Functor (Conc m) 
Instance details

Defined in UnliftIO.Internals.Async

Methods

fmap :: (a -> b) -> Conc m a -> Conc m b #

(<$) :: a -> Conc m b -> Conc m a #

Monad m => Functor (Concurrently m)

Since: unliftio-0.1.0.0

Instance details

Defined in UnliftIO.Internals.Async

Methods

fmap :: (a -> b) -> Concurrently m a -> Concurrently m b #

(<$) :: a -> Concurrently m b -> Concurrently m a #

Functor (HashMap k) 
Instance details

Defined in Data.HashMap.Internal

Methods

fmap :: (a -> b) -> HashMap k a -> HashMap k b #

(<$) :: a -> HashMap k b -> HashMap k a #

Functor (HandlerFor site) 
Instance details

Defined in Yesod.Core.Types

Methods

fmap :: (a -> b) -> HandlerFor site a -> HandlerFor site b #

(<$) :: a -> HandlerFor site b -> HandlerFor site a #

Functor (WidgetFor site) 
Instance details

Defined in Yesod.Core.Types

Methods

fmap :: (a -> b) -> WidgetFor site a -> WidgetFor site b #

(<$) :: a -> WidgetFor site b -> WidgetFor site a #

Monad m => Functor (FormInput m) 
Instance details

Defined in Yesod.Form.Input

Methods

fmap :: (a -> b) -> FormInput m a -> FormInput m b #

(<$) :: a -> FormInput m b -> FormInput m a #

Monad m => Functor (AForm m) 
Instance details

Defined in Yesod.Form.Types

Methods

fmap :: (a -> b) -> AForm m a -> AForm m b #

(<$) :: a -> AForm m b -> AForm m a #

Functor ((,) a)

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

fmap :: (a0 -> b) -> (a, a0) -> (a, b) #

(<$) :: a0 -> (a, b) -> (a, a0) #

Arrow a => Functor (WrappedArrow a b)

Since: base-2.1

Instance details

Defined in Control.Applicative

Methods

fmap :: (a0 -> b0) -> WrappedArrow a b a0 -> WrappedArrow a b b0 #

(<$) :: a0 -> WrappedArrow a b b0 -> WrappedArrow a b a0 #

Functor m => Functor (Kleisli m a)

Since: base-4.14.0.0

Instance details

Defined in Control.Arrow

Methods

fmap :: (a0 -> b) -> Kleisli m a a0 -> Kleisli m a b #

(<$) :: a0 -> Kleisli m a b -> Kleisli m a a0 #

Functor (Const m :: Type -> Type)

Since: base-2.1

Instance details

Defined in Data.Functor.Const

Methods

fmap :: (a -> b) -> Const m a -> Const m b #

(<$) :: a -> Const m b -> Const m a #

Functor f => Functor (Ap f)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

fmap :: (a -> b) -> Ap f a -> Ap f b #

(<$) :: a -> Ap f b -> Ap f a #

Functor f => Functor (Alt f)

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

fmap :: (a -> b) -> Alt f a -> Alt f b #

(<$) :: a -> Alt f b -> Alt f a #

Functor f => Functor (Rec1 f)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> Rec1 f a -> Rec1 f b #

(<$) :: a -> Rec1 f b -> Rec1 f a #

Functor (URec (Ptr ()) :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> URec (Ptr ()) a -> URec (Ptr ()) b #

(<$) :: a -> URec (Ptr ()) b -> URec (Ptr ()) a #

Functor (URec Char :: Type -> 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 (Mag a b) 
Instance details

Defined in Data.Biapplicative

Methods

fmap :: (a0 -> b0) -> Mag a b a0 -> Mag a b b0 #

(<$) :: a0 -> Mag a b b0 -> Mag a b a0 #

Bifunctor p => Functor (Join p) 
Instance details

Defined in Data.Bifunctor.Join

Methods

fmap :: (a -> b) -> Join p a -> Join p b #

(<$) :: a -> Join p b -> Join p a #

Functor w => Functor (EnvT e w) 
Instance details

Defined in Control.Comonad.Trans.Env

Methods

fmap :: (a -> b) -> EnvT e w a -> EnvT e w b #

(<$) :: a -> EnvT e w b -> EnvT e w a #

Functor w => Functor (StoreT s w) 
Instance details

Defined in Control.Comonad.Trans.Store

Methods

fmap :: (a -> b) -> StoreT s w a -> StoreT s w b #

(<$) :: a -> StoreT s w b -> StoreT s w a #

Functor w => Functor (TracedT m w) 
Instance details

Defined in Control.Comonad.Trans.Traced

Methods

fmap :: (a -> b) -> TracedT m w a -> TracedT m w b #

(<$) :: a -> TracedT m w b -> TracedT m w a #

Monad m => Functor (ZipSink i m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

fmap :: (a -> b) -> ZipSink i m a -> ZipSink i m b #

(<$) :: a -> ZipSink i m b -> ZipSink i m a #

(Applicative f, Monad f) => Functor (WhenMissing f x)

Since: containers-0.5.9

Instance details

Defined in Data.IntMap.Internal

Methods

fmap :: (a -> b) -> WhenMissing f x a -> WhenMissing f x b #

(<$) :: a -> WhenMissing f x b -> WhenMissing f x a #

Monad m => Functor (ExceptRT r m) 
Instance details

Defined in Data.EitherR

Methods

fmap :: (a -> b) -> ExceptRT r m a -> ExceptRT r m b #

(<$) :: a -> ExceptRT r m b -> ExceptRT r m a #

Functor f => Functor (FreeF f a) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

fmap :: (a0 -> b) -> FreeF f a a0 -> FreeF f a b #

(<$) :: a0 -> FreeF f a b -> FreeF f a a0 #

(Functor f, Monad m) => Functor (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

fmap :: (a -> b) -> FreeT f m a -> FreeT f m b #

(<$) :: a -> FreeT f m b -> FreeT f m a #

Functor (Day f g) 
Instance details

Defined in Data.Functor.Day

Methods

fmap :: (a -> b) -> Day f g a -> Day f g b #

(<$) :: a -> Day f g b -> Day f g a #

Functor (PCont i j) 
Instance details

Defined in Lens.Family

Methods

fmap :: (a -> b) -> PCont i j a -> PCont i j b #

(<$) :: a -> PCont i j b -> PCont i j a #

Functor (Bazaar a b) 
Instance details

Defined in Lens.Micro

Methods

fmap :: (a0 -> b0) -> Bazaar a b a0 -> Bazaar a b b0 #

(<$) :: a0 -> Bazaar a b b0 -> Bazaar a b a0 #

Functor m => Functor (StateT s m) 
Instance details

Defined in Lens.Micro

Methods

fmap :: (a -> b) -> StateT s m a -> StateT s m b #

(<$) :: a -> StateT s m b -> StateT s m a #

Functor (Effect m r) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

fmap :: (a -> b) -> Effect m r a -> Effect m r b #

(<$) :: a -> Effect m r b -> Effect m r a #

Monad m => Functor (Focusing m s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

fmap :: (a -> b) -> Focusing m s a -> Focusing m s b #

(<$) :: a -> Focusing m s b -> Focusing m s a #

Functor (k (May s)) => Functor (FocusingMay k s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

fmap :: (a -> b) -> FocusingMay k s a -> FocusingMay k s b #

(<$) :: a -> FocusingMay k s b -> FocusingMay k s a #

Functor (CopastroSum p a) 
Instance details

Defined in Data.Profunctor.Choice

Methods

fmap :: (a0 -> b) -> CopastroSum p a a0 -> CopastroSum p a b #

(<$) :: a0 -> CopastroSum p a b -> CopastroSum p a a0 #

Functor (CotambaraSum p a) 
Instance details

Defined in Data.Profunctor.Choice

Methods

fmap :: (a0 -> b) -> CotambaraSum p a a0 -> CotambaraSum p a b #

(<$) :: a0 -> CotambaraSum p a b -> CotambaraSum p a a0 #

Functor (PastroSum p a) 
Instance details

Defined in Data.Profunctor.Choice

Methods

fmap :: (a0 -> b) -> PastroSum p a a0 -> PastroSum p a b #

(<$) :: a0 -> PastroSum p a b -> PastroSum p a a0 #

Profunctor p => Functor (TambaraSum p a) 
Instance details

Defined in Data.Profunctor.Choice

Methods

fmap :: (a0 -> b) -> TambaraSum p a a0 -> TambaraSum p a b #

(<$) :: a0 -> TambaraSum p a b -> TambaraSum p a a0 #

Profunctor p => Functor (Coprep p) 
Instance details

Defined in Data.Profunctor.Rep

Methods

fmap :: (a -> b) -> Coprep p a -> Coprep p b #

(<$) :: a -> Coprep p b -> Coprep p a #

Profunctor p => Functor (Prep p) 
Instance details

Defined in Data.Profunctor.Rep

Methods

fmap :: (a -> b) -> Prep p a -> Prep p b #

(<$) :: a -> Prep p b -> Prep p a #

Functor f => Functor (Static f a) 
Instance details

Defined in Data.Semigroupoid.Static

Methods

fmap :: (a0 -> b) -> Static f a a0 -> Static f a b #

(<$) :: a0 -> Static f a b -> Static f a a0 #

Functor (Tagged s) 
Instance details

Defined in Data.Tagged

Methods

fmap :: (a -> b) -> Tagged s a -> Tagged s b #

(<$) :: a -> Tagged s b -> Tagged s a #

(Functor f, Functor g) => Functor (These1 f g) 
Instance details

Defined in Data.Functor.These

Methods

fmap :: (a -> b) -> These1 f g a -> These1 f g b #

(<$) :: a -> These1 f g b -> These1 f g a #

Functor f => Functor (Backwards f)

Derived instance.

Instance details

Defined in Control.Applicative.Backwards

Methods

fmap :: (a -> b) -> Backwards f a -> Backwards f b #

(<$) :: a -> Backwards f b -> Backwards f a #

Functor m => Functor (AccumT w m) 
Instance details

Defined in Control.Monad.Trans.Accum

Methods

fmap :: (a -> b) -> AccumT w m a -> AccumT w m b #

(<$) :: a -> AccumT w m b -> AccumT w m a #

Functor m => Functor (ErrorT e m) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

fmap :: (a -> b) -> ErrorT e m a -> ErrorT e m b #

(<$) :: a -> ErrorT e m b -> ErrorT e m a #

Functor m => Functor (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

fmap :: (a -> b) -> ExceptT e m a -> ExceptT e m b #

(<$) :: a -> ExceptT e m b -> ExceptT e m a #

Functor m => Functor (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

fmap :: (a -> b) -> IdentityT m a -> IdentityT m b #

(<$) :: a -> IdentityT m b -> IdentityT m a #

Functor m => Functor (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

fmap :: (a -> b) -> ReaderT r m a -> ReaderT r m b #

(<$) :: a -> ReaderT r m b -> ReaderT r m a #

Functor m => Functor (SelectT r m) 
Instance details

Defined in Control.Monad.Trans.Select

Methods

fmap :: (a -> b) -> SelectT r m a -> SelectT r m b #

(<$) :: a -> SelectT r m b -> SelectT r m a #

Functor m => Functor (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Lazy

Methods

fmap :: (a -> b) -> StateT s m a -> StateT s m b #

(<$) :: a -> StateT s m b -> StateT s m a #

Functor m => Functor (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

fmap :: (a -> b) -> StateT s m a -> StateT s m b #

(<$) :: a -> StateT s m b -> StateT s m a #

Functor m => Functor (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.CPS

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.Lazy

Methods

fmap :: (a -> b) -> WriterT w m a -> WriterT w m b #

(<$) :: a -> WriterT w m b -> WriterT w m a #

Functor m => Functor (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

fmap :: (a -> b) -> WriterT w m a -> WriterT w m b #

(<$) :: a -> WriterT w m b -> WriterT w m a #

Functor (Constant a :: Type -> Type) 
Instance details

Defined in Data.Functor.Constant

Methods

fmap :: (a0 -> b) -> Constant a a0 -> Constant a b #

(<$) :: a0 -> Constant a b -> Constant a a0 #

Functor f => Functor (Reverse f)

Derived instance.

Instance details

Defined in Data.Functor.Reverse

Methods

fmap :: (a -> b) -> Reverse f a -> Reverse f b #

(<$) :: a -> Reverse f b -> Reverse f a #

Monad m => Functor (Bundle m v) 
Instance details

Defined in Data.Vector.Fusion.Bundle.Monadic

Methods

fmap :: (a -> b) -> Bundle m v a -> Bundle m v b #

(<$) :: a -> Bundle m v b -> Bundle m v a #

Functor (SubHandlerFor sub master) 
Instance details

Defined in Yesod.Core.Types

Methods

fmap :: (a -> b) -> SubHandlerFor sub master a -> SubHandlerFor sub master b #

(<$) :: a -> SubHandlerFor sub master b -> SubHandlerFor sub master a #

Functor ((,,) a b)

Since: base-4.14.0.0

Instance details

Defined in GHC.Base

Methods

fmap :: (a0 -> b0) -> (a, b, a0) -> (a, b, b0) #

(<$) :: a0 -> (a, b, b0) -> (a, b, a0) #

(Functor f, Functor g) => Functor (Product f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Product

Methods

fmap :: (a -> b) -> Product f g a -> Product f g b #

(<$) :: a -> Product f g b -> Product f g a #

(Functor f, Functor g) => Functor (Sum f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Sum

Methods

fmap :: (a -> b) -> Sum f g a -> Sum f g b #

(<$) :: a -> Sum f g b -> Sum f g a #

(Functor f, Functor g) => Functor (f :*: g)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> (f :*: g) a -> (f :*: g) b #

(<$) :: a -> (f :*: g) b -> (f :*: g) a #

(Functor f, Functor g) => Functor (f :+: g)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> (f :+: g) a -> (f :+: g) b #

(<$) :: a -> (f :+: g) b -> (f :+: g) a #

Functor (K1 i c :: Type -> 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 (Cokleisli w a) 
Instance details

Defined in Control.Comonad

Methods

fmap :: (a0 -> b) -> Cokleisli w a a0 -> Cokleisli w a b #

(<$) :: a0 -> Cokleisli w a b -> Cokleisli w a a0 #

Functor (ConduitT i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

fmap :: (a -> b) -> ConduitT i o m a -> ConduitT i o m b #

(<$) :: a -> ConduitT i o m b -> ConduitT i o m a #

Functor (ZipConduit i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

fmap :: (a -> b) -> ZipConduit i o m a -> ZipConduit i o m b #

(<$) :: a -> ZipConduit i o m b -> ZipConduit i o m a #

Functor f => Functor (WhenMatched f x y)

Since: containers-0.5.9

Instance details

Defined in Data.IntMap.Internal

Methods

fmap :: (a -> b) -> WhenMatched f x y a -> WhenMatched f x y b #

(<$) :: a -> WhenMatched f x y b -> WhenMatched f x y a #

(Applicative f, Monad f) => Functor (WhenMissing f k x)

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

fmap :: (a -> b) -> WhenMissing f k x a -> WhenMissing f k x b #

(<$) :: a -> WhenMissing f k x b -> WhenMissing f k x a #

Functor (k (Err e s)) => Functor (FocusingErr e k s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

fmap :: (a -> b) -> FocusingErr e k s a -> FocusingErr e k s b #

(<$) :: a -> FocusingErr e k s b -> FocusingErr e k s a #

Functor (k (f s)) => Functor (FocusingOn f k s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

fmap :: (a -> b) -> FocusingOn f k s a -> FocusingOn f k s b #

(<$) :: a -> FocusingOn f k s b -> FocusingOn f k s a #

Functor (k (s, w)) => Functor (FocusingPlus w k s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

fmap :: (a -> b) -> FocusingPlus w k s a -> FocusingPlus w k s b #

(<$) :: a -> FocusingPlus w k s b -> FocusingPlus w k s a #

Monad m => Functor (FocusingWith w m s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

fmap :: (a -> b) -> FocusingWith w m s a -> FocusingWith w m s b #

(<$) :: a -> FocusingWith w m s b -> FocusingWith w m s a #

Functor (ContT r m) 
Instance details

Defined in Control.Monad.Trans.Cont

Methods

fmap :: (a -> b) -> ContT r m a -> ContT r m b #

(<$) :: a -> ContT r m b -> ContT r m a #

Functor ((,,,) a b c)

Since: base-4.14.0.0

Instance details

Defined in GHC.Base

Methods

fmap :: (a0 -> b0) -> (a, b, c, a0) -> (a, b, c, b0) #

(<$) :: a0 -> (a, b, c, b0) -> (a, b, c, a0) #

Functor ((->) r)

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

fmap :: (a -> b) -> (r -> a) -> r -> b #

(<$) :: a -> (r -> b) -> r -> a #

(Functor f, Functor g) => Functor (Compose f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

fmap :: (a -> b) -> Compose f g a -> Compose f g b #

(<$) :: a -> Compose f g b -> Compose f g a #

(Functor f, Functor g) => Functor (f :.: g)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> (f :.: g) a -> (f :.: g) b #

(<$) :: a -> (f :.: g) b -> (f :.: g) a #

Functor f => Functor (M1 i c f)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> M1 i c f a -> M1 i c f b #

(<$) :: a -> M1 i c f b -> M1 i c f a #

Functor (Clown f a :: Type -> Type) 
Instance details

Defined in Data.Bifunctor.Clown

Methods

fmap :: (a0 -> b) -> Clown f a a0 -> Clown f a b #

(<$) :: a0 -> Clown f a b -> Clown f a a0 #

Bifunctor p => Functor (Flip p a) 
Instance details

Defined in Data.Bifunctor.Flip

Methods

fmap :: (a0 -> b) -> Flip p a a0 -> Flip p a b #

(<$) :: a0 -> Flip p a b -> Flip p a a0 #

Functor g => Functor (Joker g a) 
Instance details

Defined in Data.Bifunctor.Joker

Methods

fmap :: (a0 -> b) -> Joker g a a0 -> Joker g a b #

(<$) :: a0 -> Joker g a b -> Joker g a a0 #

Bifunctor p => Functor (WrappedBifunctor p a) 
Instance details

Defined in Data.Bifunctor.Wrapped

Methods

fmap :: (a0 -> b) -> WrappedBifunctor p a a0 -> WrappedBifunctor p a b #

(<$) :: a0 -> WrappedBifunctor p a b -> WrappedBifunctor p a a0 #

Functor f => Functor (WhenMatched f k x y)

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

fmap :: (a -> b) -> WhenMatched f k x y a -> WhenMatched f k x y b #

(<$) :: a -> WhenMatched f k x y b -> WhenMatched f k x y a #

Functor (EffectRWS w st m s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

fmap :: (a -> b) -> EffectRWS w st m s a -> EffectRWS w st m s b #

(<$) :: a -> EffectRWS w st m s b -> EffectRWS w st m s a #

Functor m => Functor (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.CPS

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.Lazy

Methods

fmap :: (a -> b) -> RWST r w s m a -> RWST r w s m b #

(<$) :: a -> RWST r w s m b -> RWST r w s m a #

Functor m => Functor (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.Strict

Methods

fmap :: (a -> b) -> RWST r w s m a -> RWST r w s m b #

(<$) :: a -> RWST r w s m b -> RWST r w s m a #

Monad state => Functor (Builder collection mutCollection step state err) 
Instance details

Defined in Basement.MutableBuilder

Methods

fmap :: (a -> b) -> Builder collection mutCollection step state err a -> Builder collection mutCollection step state err b #

(<$) :: a -> Builder collection mutCollection step state err b -> Builder collection mutCollection step state err a #

Monad m => Functor (Pipe l i o u m) 
Instance details

Defined in Data.Conduit.Internal.Pipe

Methods

fmap :: (a -> b) -> Pipe l i o u m a -> Pipe l i o u m b #

(<$) :: a -> Pipe l i o u m b -> Pipe l i o u m a #

(Functor f, Bifunctor p) => Functor (Tannen f p a) 
Instance details

Defined in Data.Bifunctor.Tannen

Methods

fmap :: (a0 -> b) -> Tannen f p a a0 -> Tannen f p a b #

(<$) :: a0 -> Tannen f p a b -> Tannen f p a a0 #

Profunctor p => Functor (Procompose p q a) 
Instance details

Defined in Data.Profunctor.Composition

Methods

fmap :: (a0 -> b) -> Procompose p q a a0 -> Procompose p q a b #

(<$) :: a0 -> Procompose p q a b -> Procompose p q a a0 #

Profunctor p => Functor (Rift p q a) 
Instance details

Defined in Data.Profunctor.Composition

Methods

fmap :: (a0 -> b) -> Rift p q a a0 -> Rift p q a b #

(<$) :: a0 -> Rift p q a b -> Rift p q a a0 #

(Bifunctor p, Functor g) => Functor (Biff p f g a) 
Instance details

Defined in Data.Bifunctor.Biff

Methods

fmap :: (a0 -> b) -> Biff p f g a a0 -> Biff p f g a b #

(<$) :: a0 -> Biff p f g a b -> Biff p f g a a0 #

class Num a where #

Basic numeric class.

The Haskell Report defines no laws for Num. However, (+) and (*) are customarily expected to define a ring and have the following properties:

Associativity of (+)
(x + y) + z = x + (y + z)
Commutativity of (+)
x + y = y + x
fromInteger 0 is the additive identity
x + fromInteger 0 = x
negate gives the additive inverse
x + negate x = fromInteger 0
Associativity of (*)
(x * y) * z = x * (y * z)
fromInteger 1 is the multiplicative identity
x * fromInteger 1 = x and fromInteger 1 * x = x
Distributivity of (*) with respect to (+)
a * (b + c) = (a * b) + (a * c) and (b + c) * a = (b * a) + (c * a)

Note that it isn't customarily expected that a type instance of both Num and Ord implement an ordered ring. Indeed, in base only Integer and Rational do.

Minimal complete definition

(+), (*), abs, signum, fromInteger, (negate | (-))

Methods

(+) :: a -> a -> a infixl 6 #

(-) :: a -> a -> a infixl 6 #

(*) :: a -> a -> a infixl 7 #

negate :: a -> a #

Unary negation.

abs :: a -> a #

Absolute value.

signum :: a -> a #

Sign of a number. The functions abs and signum should satisfy the law:

abs x * signum x == x

For real numbers, the signum is either -1 (negative), 0 (zero) or 1 (positive).

fromInteger :: Integer -> a #

Conversion from an Integer. An integer literal represents the application of the function fromInteger to the appropriate value of type Integer, so such literals have type (Num a) => a.

Instances

Instances details
Num Pos 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

(+) :: Pos -> Pos -> Pos #

(-) :: Pos -> Pos -> Pos #

(*) :: Pos -> Pos -> Pos #

negate :: Pos -> Pos #

abs :: Pos -> Pos #

signum :: Pos -> Pos #

fromInteger :: Integer -> Pos #

Num CBool 
Instance details

Defined in Foreign.C.Types

Num CChar 
Instance details

Defined in Foreign.C.Types

Num CClock 
Instance details

Defined in Foreign.C.Types

Num CDouble 
Instance details

Defined in Foreign.C.Types

Num CFloat 
Instance details

Defined in Foreign.C.Types

Num CInt 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CInt -> CInt -> CInt #

(-) :: CInt -> CInt -> CInt #

(*) :: CInt -> CInt -> CInt #

negate :: CInt -> CInt #

abs :: CInt -> CInt #

signum :: CInt -> CInt #

fromInteger :: Integer -> CInt #

Num CIntMax 
Instance details

Defined in Foreign.C.Types

Num CIntPtr 
Instance details

Defined in Foreign.C.Types

Num CLLong 
Instance details

Defined in Foreign.C.Types

Num CLong 
Instance details

Defined in Foreign.C.Types

Num CPtrdiff 
Instance details

Defined in Foreign.C.Types

Num CSChar 
Instance details

Defined in Foreign.C.Types

Num CSUSeconds 
Instance details

Defined in Foreign.C.Types

Num CShort 
Instance details

Defined in Foreign.C.Types

Num CSigAtomic 
Instance details

Defined in Foreign.C.Types

Num CSize 
Instance details

Defined in Foreign.C.Types

Num CTime 
Instance details

Defined in Foreign.C.Types

Num CUChar 
Instance details

Defined in Foreign.C.Types

Num CUInt 
Instance details

Defined in Foreign.C.Types

Num CUIntMax 
Instance details

Defined in Foreign.C.Types

Num CUIntPtr 
Instance details

Defined in Foreign.C.Types

Num CULLong 
Instance details

Defined in Foreign.C.Types

Num CULong 
Instance details

Defined in Foreign.C.Types

Num CUSeconds 
Instance details

Defined in Foreign.C.Types

Num CUShort 
Instance details

Defined in Foreign.C.Types

Num CWchar 
Instance details

Defined in Foreign.C.Types

Num Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Num Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Num Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Num Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

(+) :: Int8 -> Int8 -> Int8 #

(-) :: Int8 -> Int8 -> Int8 #

(*) :: Int8 -> Int8 -> Int8 #

negate :: Int8 -> Int8 #

abs :: Int8 -> Int8 #

signum :: Int8 -> Int8 #

fromInteger :: Integer -> Int8 #

Num Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Num Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Num Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Num CBlkCnt 
Instance details

Defined in System.Posix.Types

Num CBlkSize 
Instance details

Defined in System.Posix.Types

Num CCc 
Instance details

Defined in System.Posix.Types

Methods

(+) :: CCc -> CCc -> CCc #

(-) :: CCc -> CCc -> CCc #

(*) :: CCc -> CCc -> CCc #

negate :: CCc -> CCc #

abs :: CCc -> CCc #

signum :: CCc -> CCc #

fromInteger :: Integer -> CCc #

Num CClockId 
Instance details

Defined in System.Posix.Types

Num CDev 
Instance details

Defined in System.Posix.Types

Methods

(+) :: CDev -> CDev -> CDev #

(-) :: CDev -> CDev -> CDev #

(*) :: CDev -> CDev -> CDev #

negate :: CDev -> CDev #

abs :: CDev -> CDev #

signum :: CDev -> CDev #

fromInteger :: Integer -> CDev #

Num CFsBlkCnt 
Instance details

Defined in System.Posix.Types

Num CFsFilCnt 
Instance details

Defined in System.Posix.Types

Num CGid 
Instance details

Defined in System.Posix.Types

Methods

(+) :: CGid -> CGid -> CGid #

(-) :: CGid -> CGid -> CGid #

(*) :: CGid -> CGid -> CGid #

negate :: CGid -> CGid #

abs :: CGid -> CGid #

signum :: CGid -> CGid #

fromInteger :: Integer -> CGid #

Num CId 
Instance details

Defined in System.Posix.Types

Methods

(+) :: CId -> CId -> CId #

(-) :: CId -> CId -> CId #

(*) :: CId -> CId -> CId #

negate :: CId -> CId #

abs :: CId -> CId #

signum :: CId -> CId #

fromInteger :: Integer -> CId #

Num CIno 
Instance details

Defined in System.Posix.Types

Methods

(+) :: CIno -> CIno -> CIno #

(-) :: CIno -> CIno -> CIno #

(*) :: CIno -> CIno -> CIno #

negate :: CIno -> CIno #

abs :: CIno -> CIno #

signum :: CIno -> CIno #

fromInteger :: Integer -> CIno #

Num CKey 
Instance details

Defined in System.Posix.Types

Methods

(+) :: CKey -> CKey -> CKey #

(-) :: CKey -> CKey -> CKey #

(*) :: CKey -> CKey -> CKey #

negate :: CKey -> CKey #

abs :: CKey -> CKey #

signum :: CKey -> CKey #

fromInteger :: Integer -> CKey #

Num CMode 
Instance details

Defined in System.Posix.Types

Num CNfds 
Instance details

Defined in System.Posix.Types

Num CNlink 
Instance details

Defined in System.Posix.Types

Num COff 
Instance details

Defined in System.Posix.Types

Methods

(+) :: COff -> COff -> COff #

(-) :: COff -> COff -> COff #

(*) :: COff -> COff -> COff #

negate :: COff -> COff #

abs :: COff -> COff #

signum :: COff -> COff #

fromInteger :: Integer -> COff #

Num CPid 
Instance details

Defined in System.Posix.Types

Methods

(+) :: CPid -> CPid -> CPid #

(-) :: CPid -> CPid -> CPid #

(*) :: CPid -> CPid -> CPid #

negate :: CPid -> CPid #

abs :: CPid -> CPid #

signum :: CPid -> CPid #

fromInteger :: Integer -> CPid #

Num CRLim 
Instance details

Defined in System.Posix.Types

Num CSocklen 
Instance details

Defined in System.Posix.Types

Num CSpeed 
Instance details

Defined in System.Posix.Types

Num CSsize 
Instance details

Defined in System.Posix.Types

Num CTcflag 
Instance details

Defined in System.Posix.Types

Num CUid 
Instance details

Defined in System.Posix.Types

Methods

(+) :: CUid -> CUid -> CUid #

(-) :: CUid -> CUid -> CUid #

(*) :: CUid -> CUid -> CUid #

negate :: CUid -> CUid #

abs :: CUid -> CUid #

signum :: CUid -> CUid #

fromInteger :: Integer -> CUid #

Num Fd 
Instance details

Defined in System.Posix.Types

Methods

(+) :: Fd -> Fd -> Fd #

(-) :: Fd -> Fd -> Fd #

(*) :: Fd -> Fd -> Fd #

negate :: Fd -> Fd #

abs :: Fd -> Fd #

signum :: Fd -> Fd #

fromInteger :: Integer -> Fd #

Num BlkHeight Source # 
Instance details

Defined in BtcLsp.Data.Type

Num MicroSeconds Source # 
Instance details

Defined in BtcLsp.Data.Type

Num Seconds Source # 
Instance details

Defined in BtcLsp.Data.Type

Num Vbyte Source # 
Instance details

Defined in BtcLsp.Data.Type

Num GCPort Source # 
Instance details

Defined in BtcLsp.Grpc.Client.LowLevel

Num InQty Source # 
Instance details

Defined in BtcLsp.Math.OnChain

Num OutQty Source # 
Instance details

Defined in BtcLsp.Math.OnChain

Num SatPerVbyte Source # 
Instance details

Defined in BtcLsp.Math.OnChain

Num TimeSpec 
Instance details

Defined in System.Clock

Num MSat 
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 Seconds 
Instance details

Defined in LndClient.Data.Newtype

Methods

(+) :: Seconds -> Seconds -> Seconds #

(-) :: Seconds -> Seconds -> Seconds #

(*) :: Seconds -> Seconds -> Seconds #

negate :: Seconds -> Seconds #

abs :: Seconds -> Seconds #

signum :: Seconds -> Seconds #

fromInteger :: Integer -> Seconds #

Num PortNumber 
Instance details

Defined in Network.Socket.Types

Num OverflowNatural 
Instance details

Defined in Database.Persist.Class.PersistField

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 Scientific

WARNING: + and - compute the Integer magnitude: 10^e where e is the difference between the base10Exponents of the arguments. If these methods are applied to arguments which have huge exponents this could fill up all space and crash your program! So don't apply these methods to scientific numbers coming from untrusted sources. The other methods can be used safely.

Instance details

Defined in Data.Scientific

Num AbsoluteSize 
Instance details

Defined in Text.Internal.CssCommon

Num EmSize 
Instance details

Defined in Text.Internal.CssCommon

Num ExSize 
Instance details

Defined in Text.Internal.CssCommon

Num PercentageSize 
Instance details

Defined in Text.Internal.CssCommon

Num PixelSize 
Instance details

Defined in Text.Internal.CssCommon

Num CodePoint 
Instance details

Defined in Data.Text.Encoding

Methods

(+) :: CodePoint -> CodePoint -> CodePoint #

(-) :: CodePoint -> CodePoint -> CodePoint #

(*) :: CodePoint -> CodePoint -> CodePoint #

negate :: CodePoint -> CodePoint #

abs :: CodePoint -> CodePoint #

signum :: CodePoint -> CodePoint #

fromInteger :: Integer -> CodePoint #

Num DecoderState 
Instance details

Defined in Data.Text.Encoding

Methods

(+) :: DecoderState -> DecoderState -> DecoderState #

(-) :: DecoderState -> DecoderState -> DecoderState #

(*) :: DecoderState -> DecoderState -> DecoderState #

negate :: DecoderState -> DecoderState #

abs :: DecoderState -> DecoderState #

signum :: DecoderState -> DecoderState #

fromInteger :: Integer -> DecoderState #

Num B 
Instance details

Defined in Data.Text.Short.Internal

Methods

(+) :: B -> B -> B #

(-) :: B -> B -> B #

(*) :: B -> B -> B #

negate :: B -> B #

abs :: B -> B #

signum :: B -> B #

fromInteger :: Integer -> B #

Num DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Num NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Num Int128 
Instance details

Defined in Data.WideWord.Int128

Num Word128 
Instance details

Defined in Data.WideWord.Word128

Num Word256 
Instance details

Defined in Data.WideWord.Word256

Num Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Num Integer

Since: base-2.1

Instance details

Defined in GHC.Num

Num Natural

Note that Natural's Num instance isn't a ring: no element but 0 has an additive inverse. It is a semiring though.

Since: base-4.8.0.0

Instance details

Defined in GHC.Num

Num Int

Since: base-2.1

Instance details

Defined in GHC.Num

Methods

(+) :: Int -> Int -> Int #

(-) :: Int -> Int -> Int #

(*) :: Int -> Int -> Int #

negate :: Int -> Int #

abs :: Int -> Int #

signum :: Int -> Int #

fromInteger :: Integer -> Int #

Num Word

Since: base-2.1

Instance details

Defined in GHC.Num

Methods

(+) :: Word -> Word -> Word #

(-) :: Word -> Word -> Word #

(*) :: Word -> Word -> Word #

negate :: Word -> Word #

abs :: Word -> Word #

signum :: Word -> Word #

fromInteger :: Integer -> Word #

RealFloat a => Num (Complex a)

Since: base-2.1

Instance details

Defined in Data.Complex

Methods

(+) :: Complex a -> Complex a -> Complex a #

(-) :: Complex a -> Complex a -> Complex a #

(*) :: Complex a -> Complex a -> Complex a #

negate :: Complex a -> Complex a #

abs :: Complex a -> Complex a #

signum :: Complex a -> Complex a #

fromInteger :: Integer -> Complex a #

Num a => Num (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Num a => Num (Down a)

Since: base-4.11.0.0

Instance details

Defined in Data.Ord

Methods

(+) :: Down a -> Down a -> Down a #

(-) :: Down a -> Down a -> Down a #

(*) :: Down a -> Down a -> Down a #

negate :: Down a -> Down a #

abs :: Down a -> Down a #

signum :: Down a -> Down a #

fromInteger :: Integer -> Down a #

Num a => Num (Max a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(+) :: Max a -> Max a -> Max a #

(-) :: Max a -> Max a -> Max a #

(*) :: Max a -> Max a -> Max a #

negate :: Max a -> Max a #

abs :: Max a -> Max a #

signum :: Max a -> Max a #

fromInteger :: Integer -> Max a #

Num a => Num (Min a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(+) :: Min a -> Min a -> Min a #

(-) :: Min a -> Min a -> Min a #

(*) :: Min a -> Min a -> Min a #

negate :: Min a -> Min a #

abs :: Min a -> Min a #

signum :: Min a -> Min a #

fromInteger :: Integer -> Min a #

Num a => Num (Product a)

Since: base-4.7.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

(+) :: Product a -> Product a -> Product a #

(-) :: Product a -> Product a -> Product a #

(*) :: Product a -> Product a -> Product a #

negate :: Product a -> Product a #

abs :: Product a -> Product a #

signum :: Product a -> Product a #

fromInteger :: Integer -> Product a #

Num a => Num (Sum a)

Since: base-4.7.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

(+) :: Sum a -> Sum a -> Sum a #

(-) :: Sum a -> Sum a -> Sum a #

(*) :: Sum a -> Sum a -> Sum a #

negate :: Sum a -> Sum a #

abs :: Sum a -> Sum a #

signum :: Sum a -> Sum a #

fromInteger :: Integer -> Sum a #

Integral a => Num (Ratio a)

Since: base-2.0.1

Instance details

Defined in GHC.Real

Methods

(+) :: Ratio a -> Ratio a -> Ratio a #

(-) :: Ratio a -> Ratio a -> Ratio a #

(*) :: Ratio a -> Ratio a -> Ratio a #

negate :: Ratio a -> Ratio a #

abs :: Ratio a -> Ratio a #

signum :: Ratio a -> Ratio a #

fromInteger :: Integer -> Ratio a #

KnownNat n => Num (Zn n) 
Instance details

Defined in Basement.Bounded

Methods

(+) :: Zn n -> Zn n -> Zn n #

(-) :: Zn n -> Zn n -> Zn n #

(*) :: Zn n -> Zn n -> Zn n #

negate :: Zn n -> Zn n #

abs :: Zn n -> Zn n #

signum :: Zn n -> Zn n #

fromInteger :: Integer -> Zn n #

(KnownNat n, NatWithinBound Word64 n) => Num (Zn64 n) 
Instance details

Defined in Basement.Bounded

Methods

(+) :: Zn64 n -> Zn64 n -> Zn64 n #

(-) :: Zn64 n -> Zn64 n -> Zn64 n #

(*) :: Zn64 n -> Zn64 n -> Zn64 n #

negate :: Zn64 n -> Zn64 n #

abs :: Zn64 n -> Zn64 n #

signum :: Zn64 n -> Zn64 n #

fromInteger :: Integer -> Zn64 n #

Num (CountOf ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

(+) :: CountOf ty -> CountOf ty -> CountOf ty #

(-) :: CountOf ty -> CountOf ty -> CountOf ty #

(*) :: CountOf ty -> CountOf ty -> CountOf ty #

negate :: CountOf ty -> CountOf ty #

abs :: CountOf ty -> CountOf ty #

signum :: CountOf ty -> CountOf ty #

fromInteger :: Integer -> CountOf ty #

Num (Offset ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

(+) :: Offset ty -> Offset ty -> Offset ty #

(-) :: Offset ty -> Offset ty -> Offset ty #

(*) :: Offset ty -> Offset ty -> Offset ty #

negate :: Offset ty -> Offset ty #

abs :: Offset ty -> Offset ty #

signum :: Offset ty -> Offset ty #

fromInteger :: Integer -> Offset ty #

Num (Liquidity dir) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

(+) :: Liquidity dir -> Liquidity dir -> Liquidity dir #

(-) :: Liquidity dir -> Liquidity dir -> Liquidity dir #

(*) :: Liquidity dir -> Liquidity dir -> Liquidity dir #

negate :: Liquidity dir -> Liquidity dir #

abs :: Liquidity dir -> Liquidity dir #

signum :: Liquidity dir -> Liquidity dir #

fromInteger :: Integer -> Liquidity dir #

(BackendCompatible b s, Num (BackendKey b)) => Num (BackendKey (Compatible b s)) 
Instance details

Defined in Database.Persist.Compatible.Types

(PersistCore b, PersistCore (RawPostgresql b), Num (BackendKey b)) => Num (BackendKey (RawPostgresql b)) 
Instance details

Defined in Database.Persist.Postgresql

HasResolution a => Num (Fixed a)

Since: base-2.1

Instance details

Defined in Data.Fixed

Methods

(+) :: Fixed a -> Fixed a -> Fixed a #

(-) :: Fixed a -> Fixed a -> Fixed a #

(*) :: Fixed a -> Fixed a -> Fixed a #

negate :: Fixed a -> Fixed a #

abs :: Fixed a -> Fixed a #

signum :: Fixed a -> Fixed a #

fromInteger :: Integer -> Fixed a #

Num a => Num (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

(+) :: Const a b -> Const a b -> Const a b #

(-) :: Const a b -> Const a b -> Const a b #

(*) :: Const a b -> Const a b -> Const a b #

negate :: Const a b -> Const a b #

abs :: Const a b -> Const a b #

signum :: Const a b -> Const a b #

fromInteger :: Integer -> Const a b #

(Applicative f, Num a) => Num (Ap f a)

Note that even if the underlying Num and Applicative instances are lawful, for most Applicatives, this instance will not be lawful. If you use this instance with the list Applicative, the following customary laws will not hold:

Commutativity:

>>> Ap [10,20] + Ap [1,2]
Ap {getAp = [11,12,21,22]}
>>> Ap [1,2] + Ap [10,20]
Ap {getAp = [11,21,12,22]}

Additive inverse:

>>> Ap [] + negate (Ap [])
Ap {getAp = []}
>>> fromInteger 0 :: Ap [] Int
Ap {getAp = [0]}

Distributivity:

>>> Ap [1,2] * (3 + 4)
Ap {getAp = [7,14]}
>>> (Ap [1,2] * 3) + (Ap [1,2] * 4)
Ap {getAp = [7,11,10,14]}

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

(+) :: Ap f a -> Ap f a -> Ap f a #

(-) :: Ap f a -> Ap f a -> Ap f a #

(*) :: Ap f a -> Ap f a -> Ap f a #

negate :: Ap f a -> Ap f a #

abs :: Ap f a -> Ap f a #

signum :: Ap f a -> Ap f a #

fromInteger :: Integer -> Ap f a #

Num (f a) => Num (Alt f a)

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

(+) :: Alt f a -> Alt f a -> Alt f a #

(-) :: Alt f a -> Alt f a -> Alt f a #

(*) :: Alt f a -> Alt f a -> Alt f a #

negate :: Alt f a -> Alt f a #

abs :: Alt f a -> Alt f a #

signum :: Alt f a -> Alt f a #

fromInteger :: Integer -> Alt f a #

Num (Money owner btcl mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

(+) :: Money owner btcl mrel -> Money owner btcl mrel -> Money owner btcl mrel #

(-) :: Money owner btcl mrel -> Money owner btcl mrel -> Money owner btcl mrel #

(*) :: Money owner btcl mrel -> Money owner btcl mrel -> Money owner btcl mrel #

negate :: Money owner btcl mrel -> Money owner btcl mrel #

abs :: Money owner btcl mrel -> Money owner btcl mrel #

signum :: Money owner btcl mrel -> Money owner btcl mrel #

fromInteger :: Integer -> Money owner btcl mrel #

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

Note that (7.) and (8.) do not require min and max to return either of their arguments. The result is merely required to equal one of the arguments in terms of (==).

Minimal complete definition: either compare or <=. Using compare can be more efficient for complex types.

Minimal complete definition

compare | (<=)

Methods

compare :: a -> a -> Ordering #

(<) :: a -> a -> Bool infix 4 #

(<=) :: a -> a -> Bool infix 4 #

(>) :: a -> a -> Bool infix 4 #

(>=) :: a -> a -> Bool infix 4 #

max :: a -> a -> a #

min :: a -> a -> a #

Instances

Instances details
Ord PixelCMYK16 
Instance details

Defined in Codec.Picture.Types

Ord PixelCMYK8 
Instance details

Defined in Codec.Picture.Types

Ord PixelRGB16 
Instance details

Defined in Codec.Picture.Types

Ord PixelRGB8 
Instance details

Defined in Codec.Picture.Types

Ord PixelRGBA16 
Instance details

Defined in Codec.Picture.Types

Ord PixelRGBA8 
Instance details

Defined in Codec.Picture.Types

Ord PixelRGBF 
Instance details

Defined in Codec.Picture.Types

Ord PixelYA16 
Instance details

Defined in Codec.Picture.Types

Ord PixelYA8 
Instance details

Defined in Codec.Picture.Types

Ord PixelYCbCr8 
Instance details

Defined in Codec.Picture.Types

Ord PixelYCbCrK8 
Instance details

Defined in Codec.Picture.Types

Ord DotNetTime 
Instance details

Defined in Data.Aeson.Types.Internal

Ord JSONPathElement 
Instance details

Defined in Data.Aeson.Types.Internal

Ord Value

The ordering is total, consistent with Eq instance. However, nothing else about the ordering is specified, and it may change from environment to environment and version to version of either this package or its dependencies (hashable and 'unordered-containers').

Since: aeson-1.5.2.0

Instance details

Defined in Data.Aeson.Types.Internal

Methods

compare :: Value -> Value -> Ordering #

(<) :: Value -> Value -> Bool #

(<=) :: Value -> Value -> Bool #

(>) :: Value -> Value -> Bool #

(>=) :: Value -> Value -> Bool #

max :: Value -> Value -> Value #

min :: Value -> Value -> Value #

Ord Pos 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

compare :: Pos -> Pos -> Ordering #

(<) :: Pos -> Pos -> Bool #

(<=) :: Pos -> Pos -> Bool #

(>) :: Pos -> Pos -> Bool #

(>=) :: Pos -> Pos -> Bool #

max :: Pos -> Pos -> Pos #

min :: Pos -> Pos -> Pos #

Ord All

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

compare :: All -> All -> Ordering #

(<) :: All -> All -> Bool #

(<=) :: All -> All -> Bool #

(>) :: All -> All -> Bool #

(>=) :: All -> All -> Bool #

max :: All -> All -> All #

min :: All -> All -> All #

Ord Any

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

compare :: Any -> Any -> Ordering #

(<) :: Any -> Any -> Bool #

(<=) :: Any -> Any -> Bool #

(>) :: Any -> Any -> Bool #

(>=) :: Any -> Any -> Bool #

max :: Any -> Any -> Any #

min :: Any -> Any -> Any #

Ord SomeTypeRep 
Instance details

Defined in Data.Typeable.Internal

Ord Version

Since: base-2.1

Instance details

Defined in Data.Version

Ord Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Methods

compare :: Void -> Void -> Ordering #

(<) :: Void -> Void -> Bool #

(<=) :: Void -> Void -> Bool #

(>) :: Void -> Void -> Bool #

(>=) :: Void -> Void -> Bool #

max :: Void -> Void -> Void #

min :: Void -> Void -> Void #

Ord CBool 
Instance details

Defined in Foreign.C.Types

Methods

compare :: CBool -> CBool -> Ordering #

(<) :: CBool -> CBool -> Bool #

(<=) :: CBool -> CBool -> Bool #

(>) :: CBool -> CBool -> Bool #

(>=) :: CBool -> CBool -> Bool #

max :: CBool -> CBool -> CBool #

min :: CBool -> CBool -> CBool #

Ord CChar 
Instance details

Defined in Foreign.C.Types

Methods

compare :: CChar -> CChar -> Ordering #

(<) :: CChar -> CChar -> Bool #

(<=) :: CChar -> CChar -> Bool #

(>) :: CChar -> CChar -> Bool #

(>=) :: CChar -> CChar -> Bool #

max :: CChar -> CChar -> CChar #

min :: CChar -> CChar -> CChar #

Ord CClock 
Instance details

Defined in Foreign.C.Types

Ord CDouble 
Instance details

Defined in Foreign.C.Types

Ord CFloat 
Instance details

Defined in Foreign.C.Types

Ord CInt 
Instance details

Defined in Foreign.C.Types

Methods

compare :: CInt -> CInt -> Ordering #

(<) :: CInt -> CInt -> Bool #

(<=) :: CInt -> CInt -> Bool #

(>) :: CInt -> CInt -> Bool #

(>=) :: CInt -> CInt -> Bool #

max :: CInt -> CInt -> CInt #

min :: CInt -> CInt -> CInt #

Ord CIntMax 
Instance details

Defined in Foreign.C.Types

Ord CIntPtr 
Instance details

Defined in Foreign.C.Types

Ord CLLong 
Instance details

Defined in Foreign.C.Types

Ord CLong 
Instance details

Defined in Foreign.C.Types

Methods

compare :: CLong -> CLong -> Ordering #

(<) :: CLong -> CLong -> Bool #

(<=) :: CLong -> CLong -> Bool #

(>) :: CLong -> CLong -> Bool #

(>=) :: CLong -> CLong -> Bool #

max :: CLong -> CLong -> CLong #

min :: CLong -> CLong -> CLong #

Ord CPtrdiff 
Instance details

Defined in Foreign.C.Types

Ord CSChar 
Instance details

Defined in Foreign.C.Types

Ord CSUSeconds 
Instance details

Defined in Foreign.C.Types

Ord CShort 
Instance details

Defined in Foreign.C.Types

Ord CSigAtomic 
Instance details

Defined in Foreign.C.Types

Ord CSize 
Instance details

Defined in Foreign.C.Types

Methods

compare :: CSize -> CSize -> Ordering #

(<) :: CSize -> CSize -> Bool #

(<=) :: CSize -> CSize -> Bool #

(>) :: CSize -> CSize -> Bool #

(>=) :: CSize -> CSize -> Bool #

max :: CSize -> CSize -> CSize #

min :: CSize -> CSize -> CSize #

Ord CTime 
Instance details

Defined in Foreign.C.Types

Methods

compare :: CTime -> CTime -> Ordering #

(<) :: CTime -> CTime -> Bool #

(<=) :: CTime -> CTime -> Bool #

(>) :: CTime -> CTime -> Bool #

(>=) :: CTime -> CTime -> Bool #

max :: CTime -> CTime -> CTime #

min :: CTime -> CTime -> CTime #

Ord CUChar 
Instance details

Defined in Foreign.C.Types

Ord CUInt 
Instance details

Defined in Foreign.C.Types

Methods

compare :: CUInt -> CUInt -> Ordering #

(<) :: CUInt -> CUInt -> Bool #

(<=) :: CUInt -> CUInt -> Bool #

(>) :: CUInt -> CUInt -> Bool #

(>=) :: CUInt -> CUInt -> Bool #

max :: CUInt -> CUInt -> CUInt #

min :: CUInt -> CUInt -> CUInt #

Ord CUIntMax 
Instance details

Defined in Foreign.C.Types

Ord CUIntPtr 
Instance details

Defined in Foreign.C.Types

Ord CULLong 
Instance details

Defined in Foreign.C.Types

Ord CULong 
Instance details

Defined in Foreign.C.Types

Ord CUSeconds 
Instance details

Defined in Foreign.C.Types

Ord CUShort 
Instance details

Defined in Foreign.C.Types

Ord CWchar 
Instance details

Defined in Foreign.C.Types

Ord BlockReason

Since: base-4.3.0.0

Instance details

Defined in GHC.Conc.Sync

Ord ThreadId

Since: base-4.2.0.0

Instance details

Defined in GHC.Conc.Sync

Ord ThreadStatus

Since: base-4.3.0.0

Instance details

Defined in GHC.Conc.Sync

Ord 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 Associativity

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Ord DecidedStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Ord Fixity

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Ord SourceStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Ord SourceUnpackedness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Ord SeekMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Device

Ord ArrayException

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Exception

Ord AsyncException

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Exception

Ord ExitCode 
Instance details

Defined in GHC.IO.Exception

Ord BufferMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Handle.Types

Ord Newline

Since: base-4.3.0.0

Instance details

Defined in GHC.IO.Handle.Types

Ord NewlineMode

Since: base-4.3.0.0

Instance details

Defined in GHC.IO.Handle.Types

Ord IOMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.IOMode

Ord Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

compare :: Int16 -> Int16 -> Ordering #

(<) :: Int16 -> Int16 -> Bool #

(<=) :: Int16 -> Int16 -> Bool #

(>) :: Int16 -> Int16 -> Bool #

(>=) :: Int16 -> Int16 -> Bool #

max :: Int16 -> Int16 -> Int16 #

min :: Int16 -> Int16 -> Int16 #

Ord Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

compare :: Int32 -> Int32 -> Ordering #

(<) :: Int32 -> Int32 -> Bool #

(<=) :: Int32 -> Int32 -> Bool #

(>) :: Int32 -> Int32 -> Bool #

(>=) :: Int32 -> Int32 -> Bool #

max :: Int32 -> Int32 -> Int32 #

min :: Int32 -> Int32 -> Int32 #

Ord Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

compare :: Int64 -> Int64 -> Ordering #

(<) :: Int64 -> Int64 -> Bool #

(<=) :: Int64 -> Int64 -> Bool #

(>) :: Int64 -> Int64 -> Bool #

(>=) :: Int64 -> Int64 -> Bool #

max :: Int64 -> Int64 -> Int64 #

min :: Int64 -> Int64 -> Int64 #

Ord Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

compare :: Int8 -> Int8 -> Ordering #

(<) :: Int8 -> Int8 -> Bool #

(<=) :: Int8 -> Int8 -> Bool #

(>) :: Int8 -> Int8 -> Bool #

(>=) :: Int8 -> Int8 -> Bool #

max :: Int8 -> Int8 -> Int8 #

min :: Int8 -> Int8 -> Int8 #

Ord 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 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 CBlkCnt 
Instance details

Defined in System.Posix.Types

Ord CBlkSize 
Instance details

Defined in System.Posix.Types

Ord CCc 
Instance details

Defined in System.Posix.Types

Methods

compare :: CCc -> CCc -> Ordering #

(<) :: CCc -> CCc -> Bool #

(<=) :: CCc -> CCc -> Bool #

(>) :: CCc -> CCc -> Bool #

(>=) :: CCc -> CCc -> Bool #

max :: CCc -> CCc -> CCc #

min :: CCc -> CCc -> CCc #

Ord CClockId 
Instance details

Defined in System.Posix.Types

Ord CDev 
Instance details

Defined in System.Posix.Types

Methods

compare :: CDev -> CDev -> Ordering #

(<) :: CDev -> CDev -> Bool #

(<=) :: CDev -> CDev -> Bool #

(>) :: CDev -> CDev -> Bool #

(>=) :: CDev -> CDev -> Bool #

max :: CDev -> CDev -> CDev #

min :: CDev -> CDev -> CDev #

Ord CFsBlkCnt 
Instance details

Defined in System.Posix.Types

Ord CFsFilCnt 
Instance details

Defined in System.Posix.Types

Ord CGid 
Instance details

Defined in System.Posix.Types

Methods

compare :: CGid -> CGid -> Ordering #

(<) :: CGid -> CGid -> Bool #

(<=) :: CGid -> CGid -> Bool #

(>) :: CGid -> CGid -> Bool #

(>=) :: CGid -> CGid -> Bool #

max :: CGid -> CGid -> CGid #

min :: CGid -> CGid -> CGid #

Ord CId 
Instance details

Defined in System.Posix.Types

Methods

compare :: CId -> CId -> Ordering #

(<) :: CId -> CId -> Bool #

(<=) :: CId -> CId -> Bool #

(>) :: CId -> CId -> Bool #

(>=) :: CId -> CId -> Bool #

max :: CId -> CId -> CId #

min :: CId -> CId -> CId #

Ord CIno 
Instance details

Defined in System.Posix.Types

Methods

compare :: CIno -> CIno -> Ordering #

(<) :: CIno -> CIno -> Bool #

(<=) :: CIno -> CIno -> Bool #

(>) :: CIno -> CIno -> Bool #

(>=) :: CIno -> CIno -> Bool #

max :: CIno -> CIno -> CIno #

min :: CIno -> CIno -> CIno #

Ord CKey 
Instance details

Defined in System.Posix.Types

Methods

compare :: CKey -> CKey -> Ordering #

(<) :: CKey -> CKey -> Bool #

(<=) :: CKey -> CKey -> Bool #

(>) :: CKey -> CKey -> Bool #

(>=) :: CKey -> CKey -> Bool #

max :: CKey -> CKey -> CKey #

min :: CKey -> CKey -> CKey #

Ord CMode 
Instance details

Defined in System.Posix.Types

Methods

compare :: CMode -> CMode -> Ordering #

(<) :: CMode -> CMode -> Bool #

(<=) :: CMode -> CMode -> Bool #

(>) :: CMode -> CMode -> Bool #

(>=) :: CMode -> CMode -> Bool #

max :: CMode -> CMode -> CMode #

min :: CMode -> CMode -> CMode #

Ord CNfds 
Instance details

Defined in System.Posix.Types

Methods

compare :: CNfds -> CNfds -> Ordering #

(<) :: CNfds -> CNfds -> Bool #

(<=) :: CNfds -> CNfds -> Bool #

(>) :: CNfds -> CNfds -> Bool #

(>=) :: CNfds -> CNfds -> Bool #

max :: CNfds -> CNfds -> CNfds #

min :: CNfds -> CNfds -> CNfds #

Ord CNlink 
Instance details

Defined in System.Posix.Types

Ord COff 
Instance details

Defined in System.Posix.Types

Methods

compare :: COff -> COff -> Ordering #

(<) :: COff -> COff -> Bool #

(<=) :: COff -> COff -> Bool #

(>) :: COff -> COff -> Bool #

(>=) :: COff -> COff -> Bool #

max :: COff -> COff -> COff #

min :: COff -> COff -> COff #

Ord CPid 
Instance details

Defined in System.Posix.Types

Methods

compare :: CPid -> CPid -> Ordering #

(<) :: CPid -> CPid -> Bool #

(<=) :: CPid -> CPid -> Bool #

(>) :: CPid -> CPid -> Bool #

(>=) :: CPid -> CPid -> Bool #

max :: CPid -> CPid -> CPid #

min :: CPid -> CPid -> CPid #

Ord CRLim 
Instance details

Defined in System.Posix.Types

Methods

compare :: CRLim -> CRLim -> Ordering #

(<) :: CRLim -> CRLim -> Bool #

(<=) :: CRLim -> CRLim -> Bool #

(>) :: CRLim -> CRLim -> Bool #

(>=) :: CRLim -> CRLim -> Bool #

max :: CRLim -> CRLim -> CRLim #

min :: CRLim -> CRLim -> CRLim #

Ord CSocklen 
Instance details

Defined in System.Posix.Types

Ord CSpeed 
Instance details

Defined in System.Posix.Types

Ord CSsize 
Instance details

Defined in System.Posix.Types

Ord CTcflag 
Instance details

Defined in System.Posix.Types

Ord CTimer 
Instance details

Defined in System.Posix.Types

Ord CUid 
Instance details

Defined in System.Posix.Types

Methods

compare :: CUid -> CUid -> Ordering #

(<) :: CUid -> CUid -> Bool #

(<=) :: CUid -> CUid -> Bool #

(>) :: CUid -> CUid -> Bool #

(>=) :: CUid -> CUid -> Bool #

max :: CUid -> CUid -> CUid #

min :: CUid -> CUid -> CUid #

Ord Fd 
Instance details

Defined in System.Posix.Types

Methods

compare :: Fd -> Fd -> Ordering #

(<) :: Fd -> Fd -> Bool #

(<=) :: Fd -> Fd -> Bool #

(>) :: Fd -> Fd -> Bool #

(>=) :: Fd -> Fd -> Bool #

max :: Fd -> Fd -> Fd #

min :: Fd -> Fd -> Fd #

Ord Encoding 
Instance details

Defined in Basement.String

Ord UTF32_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF32

Methods

compare :: UTF32_Invalid -> UTF32_Invalid -> Ordering #

(<) :: UTF32_Invalid -> UTF32_Invalid -> Bool #

(<=) :: UTF32_Invalid -> UTF32_Invalid -> Bool #

(>) :: UTF32_Invalid -> UTF32_Invalid -> Bool #

(>=) :: UTF32_Invalid -> UTF32_Invalid -> Bool #

max :: UTF32_Invalid -> UTF32_Invalid -> UTF32_Invalid #

min :: UTF32_Invalid -> UTF32_Invalid -> UTF32_Invalid #

Ord FileSize 
Instance details

Defined in Basement.Types.OffsetSize

Ord String 
Instance details

Defined in Basement.UTF8.Base

Ord BitcoinLayer Source # 
Instance details

Defined in BtcLsp.Data.Kind

Ord Direction Source # 
Instance details

Defined in BtcLsp.Data.Kind

Ord MoneyRelation Source # 
Instance details

Defined in BtcLsp.Data.Kind

Ord Owner Source # 
Instance details

Defined in BtcLsp.Data.Kind

Methods

compare :: Owner -> Owner -> Ordering #

(<) :: Owner -> Owner -> Bool #

(<=) :: Owner -> Owner -> Bool #

(>) :: Owner -> Owner -> Bool #

(>=) :: Owner -> Owner -> Bool #

max :: Owner -> Owner -> Owner #

min :: Owner -> Owner -> Owner #

Ord Table Source # 
Instance details

Defined in BtcLsp.Data.Kind

Methods

compare :: Table -> Table -> Ordering #

(<) :: Table -> Table -> Bool #

(<=) :: Table -> Table -> Bool #

(>) :: Table -> Table -> Bool #

(>=) :: Table -> Table -> Bool #

max :: Table -> Table -> Table #

min :: Table -> Table -> Table #

Ord BlkHash Source # 
Instance details

Defined in BtcLsp.Data.Type

Ord BlkHeight Source # 
Instance details

Defined in BtcLsp.Data.Type

Ord BlkStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Ord FeeRate Source # 
Instance details

Defined in BtcLsp.Data.Type

Ord LnChanStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Ord MicroSeconds Source # 
Instance details

Defined in BtcLsp.Data.Type

Ord NodePubKeyHex Source # 
Instance details

Defined in BtcLsp.Data.Type

Ord NodeUri Source # 
Instance details

Defined in BtcLsp.Data.Type

Ord NodeUriHex Source # 
Instance details

Defined in BtcLsp.Data.Type

Ord Nonce Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

compare :: Nonce -> Nonce -> Ordering #

(<) :: Nonce -> Nonce -> Bool #

(<=) :: Nonce -> Nonce -> Bool #

(>) :: Nonce -> Nonce -> Bool #

(>=) :: Nonce -> Nonce -> Bool #

max :: Nonce -> Nonce -> Nonce #

min :: Nonce -> Nonce -> Nonce #

Ord Privacy Source # 
Instance details

Defined in BtcLsp.Data.Type

Ord RHashHex Source # 
Instance details

Defined in BtcLsp.Data.Type

Ord RowQty Source # 
Instance details

Defined in BtcLsp.Data.Type

Ord Seconds Source # 
Instance details

Defined in BtcLsp.Data.Type

Ord SocketAddress Source # 
Instance details

Defined in BtcLsp.Data.Type

Ord SwapStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Ord SwapUtxoStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Ord UtxoLockId Source # 
Instance details

Defined in BtcLsp.Data.Type

Ord Vbyte Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

compare :: Vbyte -> Vbyte -> Ordering #

(<) :: Vbyte -> Vbyte -> Bool #

(<=) :: Vbyte -> Vbyte -> Bool #

(>) :: Vbyte -> Vbyte -> Bool #

(>=) :: Vbyte -> Vbyte -> Bool #

max :: Vbyte -> Vbyte -> Vbyte #

min :: Vbyte -> Vbyte -> Vbyte #

Ord YesodLog Source # 
Instance details

Defined in BtcLsp.Data.Type

Ord GCPort Source # 
Instance details

Defined in BtcLsp.Grpc.Client.LowLevel

Ord Encryption Source # 
Instance details

Defined in BtcLsp.Grpc.Data

Ord RawRequestBytes Source # 
Instance details

Defined in BtcLsp.Grpc.Data

Ord SigHeaderName Source # 
Instance details

Defined in BtcLsp.Grpc.Data

Ord LndSig Source # 
Instance details

Defined in BtcLsp.Grpc.Sig

Ord MsgToSign Source # 
Instance details

Defined in BtcLsp.Grpc.Sig

Ord InQty Source # 
Instance details

Defined in BtcLsp.Math.OnChain

Methods

compare :: InQty -> InQty -> Ordering #

(<) :: InQty -> InQty -> Bool #

(<=) :: InQty -> InQty -> Bool #

(>) :: InQty -> InQty -> Bool #

(>=) :: InQty -> InQty -> Bool #

max :: InQty -> InQty -> InQty #

min :: InQty -> InQty -> InQty #

Ord OutQty Source # 
Instance details

Defined in BtcLsp.Math.OnChain

Ord SatPerVbyte Source # 
Instance details

Defined in BtcLsp.Math.OnChain

Ord SwapCap Source # 
Instance details

Defined in BtcLsp.Math.Swap

Ord Block Source # 
Instance details

Defined in BtcLsp.Storage.Model

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 LnChan Source # 
Instance details

Defined in BtcLsp.Storage.Model

Ord SwapUtxo Source # 
Instance details

Defined in BtcLsp.Storage.Model

Ord User Source # 
Instance details

Defined in BtcLsp.Storage.Model

Methods

compare :: User -> User -> Ordering #

(<) :: User -> User -> Bool #

(<=) :: User -> User -> Bool #

(>) :: User -> User -> Bool #

(>=) :: User -> User -> Bool #

max :: User -> User -> User #

min :: User -> User -> User #

Ord HtmlClassAttr Source # 
Instance details

Defined in BtcLsp.Yesod.Data.Widget

Ord Layout Source # 
Instance details

Defined in BtcLsp.Yesod.Data.Widget

Ord Ctx Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

compare :: Ctx -> Ctx -> Ordering #

(<) :: Ctx -> Ctx -> Bool #

(<=) :: Ctx -> Ctx -> Bool #

(>) :: Ctx -> Ctx -> Bool #

(>=) :: Ctx -> Ctx -> Bool #

max :: Ctx -> Ctx -> Ctx #

min :: Ctx -> Ctx -> Ctx #

Ord FeeMoney Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Ord FeeRate Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Ord FieldIndex Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Ord FundLnHodlInvoice Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Ord FundLnInvoice Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Ord FundMoney Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Ord FundOnChainAddress Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Ord InputFailure Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Ord InputFailureKind Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Ord InputFailureKind'UnrecognizedValue Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Ord InternalFailure Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Ord InternalFailure'Either Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Ord LnHost Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Ord LnPeer Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Ord LnPort Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Ord LnPubKey Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Ord LocalBalance Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Ord Nonce Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

compare :: Nonce -> Nonce -> Ordering #

(<) :: Nonce -> Nonce -> Bool #

(<=) :: Nonce -> Nonce -> Bool #

(>) :: Nonce -> Nonce -> Bool #

(>=) :: Nonce -> Nonce -> Bool #

max :: Nonce -> Nonce -> Nonce #

min :: Nonce -> Nonce -> Nonce #

Ord Privacy Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Ord Privacy'UnrecognizedValue Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Ord RefundMoney Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Ord RefundOnChainAddress Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Ord RemoteBalance Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Ord LnHodlInvoice Source # 
Instance details

Defined in Proto.BtcLsp.Data.LowLevel

Ord LnInvoice Source # 
Instance details

Defined in Proto.BtcLsp.Data.LowLevel

Ord Msat Source # 
Instance details

Defined in Proto.BtcLsp.Data.LowLevel

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 OnChainAddress Source # 
Instance details

Defined in Proto.BtcLsp.Data.LowLevel

Ord Urational Source # 
Instance details

Defined in Proto.BtcLsp.Data.LowLevel

Ord Request Source # 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Ord Response Source # 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Ord Response'Either Source # 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Ord Response'Failure Source # 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Ord Response'Failure'InputFailure Source # 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Ord Response'Failure'InputFailure'UnrecognizedValue Source # 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Ord Response'Success Source # 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Ord Request Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Ord Response Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Ord Response'Either Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Ord Response'Failure Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Ord Response'Failure'InputFailure Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Ord Response'Failure'InputFailure'UnrecognizedValue Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Ord Response'Success Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Ord Request Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Ord Response Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Ord Response'Either Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Ord Response'Failure Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Ord Response'Failure'InputFailure Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Ord Response'Failure'InputFailure'UnrecognizedValue Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Ord Response'Success Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Ord Bytes 
Instance details

Defined in Data.Bytes.Internal

Methods

compare :: Bytes -> Bytes -> Ordering #

(<) :: Bytes -> Bytes -> Bool #

(<=) :: Bytes -> Bytes -> Bool #

(>) :: Bytes -> Bytes -> Bool #

(>=) :: Bytes -> Bytes -> Bool #

max :: Bytes -> Bytes -> Bytes #

min :: Bytes -> Bytes -> Bytes #

Ord ByteString 
Instance details

Defined in Data.ByteString.Internal

Ord ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Ord ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Ord 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

Ord DatetimeFormat 
Instance details

Defined in Chronos

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

Ord DayOfWeek 
Instance details

Defined in Chronos

Ord DayOfYear 
Instance details

Defined in Chronos

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

Ord Offset 
Instance details

Defined in Chronos

Ord OffsetDatetime 
Instance details

Defined in Chronos

Ord OffsetFormat 
Instance details

Defined in Chronos

Ord OrdinalDate 
Instance details

Defined in Chronos

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

Ord TimeOfDay 
Instance details

Defined in Chronos

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 IV 
Instance details

Defined in Web.ClientSession

Methods

compare :: IV -> IV -> Ordering #

(<) :: IV -> IV -> Bool #

(<=) :: IV -> IV -> Bool #

(>) :: IV -> IV -> Bool #

(>=) :: IV -> IV -> Bool #

max :: IV -> IV -> IV #

min :: IV -> IV -> IV #

Ord TimeSpec 
Instance details

Defined in System.Clock

Ord IntSet 
Instance details

Defined in Data.IntSet.Internal

Ord EmailAddress 
Instance details

Defined in Text.Email.Parser

Ord Ident 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Methods

compare :: Ident -> Ident -> Ordering #

(<) :: Ident -> Ident -> Bool #

(<=) :: Ident -> Ident -> Bool #

(>) :: Ident -> Ident -> Bool #

(>=) :: Ident -> Ident -> Bool #

max :: Ident -> Ident -> Ident #

min :: Ident -> Ident -> Ident #

Ord OnClauseWithoutMatchingJoinException 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Ord SecretVision 
Instance details

Defined in Text.PrettyPrint.GenericPretty.Type

Ord BigNat 
Instance details

Defined in GHC.Num.BigNat

Ord Extension 
Instance details

Defined in GHC.LanguageExtensions.Type

Ord Ordering 
Instance details

Defined in GHC.Classes

Ord TyCon 
Instance details

Defined in GHC.Classes

Methods

compare :: TyCon -> TyCon -> Ordering #

(<) :: TyCon -> TyCon -> Bool #

(<=) :: TyCon -> TyCon -> Bool #

(>) :: TyCon -> TyCon -> Bool #

(>=) :: TyCon -> TyCon -> Bool #

max :: TyCon -> TyCon -> TyCon #

min :: TyCon -> TyCon -> TyCon #

Ord ConnHost 
Instance details

Defined in Network.HTTP.Client.Types

Ord ConnKey 
Instance details

Defined in Network.HTTP.Client.Types

Ord Proxy 
Instance details

Defined in Network.HTTP.Client.Types

Methods

compare :: Proxy -> Proxy -> Ordering #

(<) :: Proxy -> Proxy -> Bool #

(<=) :: Proxy -> Proxy -> Bool #

(>) :: Proxy -> Proxy -> Bool #

(>=) :: Proxy -> Proxy -> Bool #

max :: Proxy -> Proxy -> Proxy #

min :: Proxy -> Proxy -> Proxy #

Ord ProxySecureMode 
Instance details

Defined in Network.HTTP.Client.Types

Ord StatusHeaders 
Instance details

Defined in Network.HTTP.Client.Types

Ord StreamFileStatus 
Instance details

Defined in Network.HTTP.Client.Types

Ord DigestAuthExceptionDetails 
Instance details

Defined in Network.HTTP.Client.TLS

Ord ByteRange 
Instance details

Defined in Network.HTTP.Types.Header

Ord StdMethod 
Instance details

Defined in Network.HTTP.Types.Method

Ord Status 
Instance details

Defined in Network.HTTP.Types.Status

Ord EscapeItem 
Instance details

Defined in Network.HTTP.Types.URI

Ord HttpVersion 
Instance details

Defined in Network.HTTP.Types.Version

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 ErrorCodeId 
Instance details

Defined in Network.HTTP2.Frame.Types

Ord FrameTypeId 
Instance details

Defined in Network.HTTP2.Frame.Types

Ord SettingsKeyId 
Instance details

Defined in Network.HTTP2.Frame.Types

Ord ClientError 
Instance details

Defined in Network.HTTP2.Client2.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 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 IP 
Instance details

Defined in Data.IP.Addr

Methods

compare :: IP -> IP -> Ordering #

(<) :: IP -> IP -> Bool #

(<=) :: IP -> IP -> Bool #

(>) :: IP -> IP -> Bool #

(>=) :: IP -> IP -> Bool #

max :: IP -> IP -> IP #

min :: IP -> IP -> IP #

Ord IPv4 
Instance details

Defined in Data.IP.Addr

Methods

compare :: IPv4 -> IPv4 -> Ordering #

(<) :: IPv4 -> IPv4 -> Bool #

(<=) :: IPv4 -> IPv4 -> Bool #

(>) :: IPv4 -> IPv4 -> Bool #

(>=) :: IPv4 -> IPv4 -> Bool #

max :: IPv4 -> IPv4 -> IPv4 #

min :: IPv4 -> IPv4 -> IPv4 #

Ord IPv6 
Instance details

Defined in Data.IP.Addr

Methods

compare :: IPv6 -> IPv6 -> Ordering #

(<) :: IPv6 -> IPv6 -> Bool #

(<=) :: IPv6 -> IPv6 -> Bool #

(>) :: IPv6 -> IPv6 -> Bool #

(>=) :: IPv6 -> IPv6 -> Bool #

max :: IPv6 -> IPv6 -> IPv6 #

min :: IPv6 -> IPv6 -> IPv6 #

Ord IPRange 
Instance details

Defined in Data.IP.Range

Ord Environment 
Instance details

Defined in Katip.Core

Ord Namespace 
Instance details

Defined in Katip.Core

Ord Severity 
Instance details

Defined in Katip.Core

Ord ThreadIdText 
Instance details

Defined in Katip.Core

Ord Verbosity 
Instance details

Defined in Katip.Core

Ord Channel 
Instance details

Defined in LndClient.Data.Channel

Methods

compare :: Channel -> Channel -> Ordering #

(<) :: Channel -> Channel -> Bool #

(<=) :: Channel -> Channel -> Bool #

(>) :: Channel -> Channel -> Bool #

(>=) :: Channel -> Channel -> Bool #

max :: Channel -> Channel -> Channel #

min :: Channel -> Channel -> Channel #

Ord ChannelBackup 
Instance details

Defined in LndClient.Data.ChannelBackup

Methods

compare :: ChannelBackup -> ChannelBackup -> Ordering #

(<) :: ChannelBackup -> ChannelBackup -> Bool #

(<=) :: ChannelBackup -> ChannelBackup -> Bool #

(>) :: ChannelBackup -> ChannelBackup -> Bool #

(>=) :: ChannelBackup -> ChannelBackup -> Bool #

max :: ChannelBackup -> ChannelBackup -> ChannelBackup #

min :: ChannelBackup -> ChannelBackup -> ChannelBackup #

Ord SingleChanBackupBlob 
Instance details

Defined in LndClient.Data.ChannelBackup

Methods

compare :: SingleChanBackupBlob -> SingleChanBackupBlob -> Ordering #

(<) :: SingleChanBackupBlob -> SingleChanBackupBlob -> Bool #

(<=) :: SingleChanBackupBlob -> SingleChanBackupBlob -> Bool #

(>) :: SingleChanBackupBlob -> SingleChanBackupBlob -> Bool #

(>=) :: SingleChanBackupBlob -> SingleChanBackupBlob -> Bool #

max :: SingleChanBackupBlob -> SingleChanBackupBlob -> SingleChanBackupBlob #

min :: SingleChanBackupBlob -> SingleChanBackupBlob -> SingleChanBackupBlob #

Ord ChannelPoint 
Instance details

Defined in LndClient.Data.ChannelPoint

Methods

compare :: ChannelPoint -> ChannelPoint -> Ordering #

(<) :: ChannelPoint -> ChannelPoint -> Bool #

(<=) :: ChannelPoint -> ChannelPoint -> Bool #

(>) :: ChannelPoint -> ChannelPoint -> Bool #

(>=) :: ChannelPoint -> ChannelPoint -> Bool #

max :: ChannelPoint -> ChannelPoint -> ChannelPoint #

min :: ChannelPoint -> ChannelPoint -> ChannelPoint #

Ord ChannelCloseSummary 
Instance details

Defined in LndClient.Data.CloseChannel

Methods

compare :: ChannelCloseSummary -> ChannelCloseSummary -> Ordering #

(<) :: ChannelCloseSummary -> ChannelCloseSummary -> Bool #

(<=) :: ChannelCloseSummary -> ChannelCloseSummary -> Bool #

(>) :: ChannelCloseSummary -> ChannelCloseSummary -> Bool #

(>=) :: ChannelCloseSummary -> ChannelCloseSummary -> Bool #

max :: ChannelCloseSummary -> ChannelCloseSummary -> ChannelCloseSummary #

min :: ChannelCloseSummary -> ChannelCloseSummary -> ChannelCloseSummary #

Ord ChannelCloseUpdate 
Instance details

Defined in LndClient.Data.CloseChannel

Methods

compare :: ChannelCloseUpdate -> ChannelCloseUpdate -> Ordering #

(<) :: ChannelCloseUpdate -> ChannelCloseUpdate -> Bool #

(<=) :: ChannelCloseUpdate -> ChannelCloseUpdate -> Bool #

(>) :: ChannelCloseUpdate -> ChannelCloseUpdate -> Bool #

(>=) :: ChannelCloseUpdate -> ChannelCloseUpdate -> Bool #

max :: ChannelCloseUpdate -> ChannelCloseUpdate -> ChannelCloseUpdate #

min :: ChannelCloseUpdate -> ChannelCloseUpdate -> ChannelCloseUpdate #

Ord CloseChannelRequest 
Instance details

Defined in LndClient.Data.CloseChannel

Methods

compare :: CloseChannelRequest -> CloseChannelRequest -> Ordering #

(<) :: CloseChannelRequest -> CloseChannelRequest -> Bool #

(<=) :: CloseChannelRequest -> CloseChannelRequest -> Bool #

(>) :: CloseChannelRequest -> CloseChannelRequest -> Bool #

(>=) :: CloseChannelRequest -> CloseChannelRequest -> Bool #

max :: CloseChannelRequest -> CloseChannelRequest -> CloseChannelRequest #

min :: CloseChannelRequest -> CloseChannelRequest -> CloseChannelRequest #

Ord CloseStatusUpdate 
Instance details

Defined in LndClient.Data.CloseChannel

Methods

compare :: CloseStatusUpdate -> CloseStatusUpdate -> Ordering #

(<) :: CloseStatusUpdate -> CloseStatusUpdate -> Bool #

(<=) :: CloseStatusUpdate -> CloseStatusUpdate -> Bool #

(>) :: CloseStatusUpdate -> CloseStatusUpdate -> Bool #

(>=) :: CloseStatusUpdate -> CloseStatusUpdate -> Bool #

max :: CloseStatusUpdate -> CloseStatusUpdate -> CloseStatusUpdate #

min :: CloseStatusUpdate -> CloseStatusUpdate -> CloseStatusUpdate #

Ord ClosedChannelsRequest 
Instance details

Defined in LndClient.Data.ClosedChannels

Methods

compare :: ClosedChannelsRequest -> ClosedChannelsRequest -> Ordering #

(<) :: ClosedChannelsRequest -> ClosedChannelsRequest -> Bool #

(<=) :: ClosedChannelsRequest -> ClosedChannelsRequest -> Bool #

(>) :: ClosedChannelsRequest -> ClosedChannelsRequest -> Bool #

(>=) :: ClosedChannelsRequest -> ClosedChannelsRequest -> Bool #

max :: ClosedChannelsRequest -> ClosedChannelsRequest -> ClosedChannelsRequest #

min :: ClosedChannelsRequest -> ClosedChannelsRequest -> ClosedChannelsRequest #

Ord FinalizePsbtRequest 
Instance details

Defined in LndClient.Data.FinalizePsbt

Methods

compare :: FinalizePsbtRequest -> FinalizePsbtRequest -> Ordering #

(<) :: FinalizePsbtRequest -> FinalizePsbtRequest -> Bool #

(<=) :: FinalizePsbtRequest -> FinalizePsbtRequest -> Bool #

(>) :: FinalizePsbtRequest -> FinalizePsbtRequest -> Bool #

(>=) :: FinalizePsbtRequest -> FinalizePsbtRequest -> Bool #

max :: FinalizePsbtRequest -> FinalizePsbtRequest -> FinalizePsbtRequest #

min :: FinalizePsbtRequest -> FinalizePsbtRequest -> FinalizePsbtRequest #

Ord FinalizePsbtResponse 
Instance details

Defined in LndClient.Data.FinalizePsbt

Methods

compare :: FinalizePsbtResponse -> FinalizePsbtResponse -> Ordering #

(<) :: FinalizePsbtResponse -> FinalizePsbtResponse -> Bool #

(<=) :: FinalizePsbtResponse -> FinalizePsbtResponse -> Bool #

(>) :: FinalizePsbtResponse -> FinalizePsbtResponse -> Bool #

(>=) :: FinalizePsbtResponse -> FinalizePsbtResponse -> Bool #

max :: FinalizePsbtResponse -> FinalizePsbtResponse -> FinalizePsbtResponse #

min :: FinalizePsbtResponse -> FinalizePsbtResponse -> FinalizePsbtResponse #

Ord Fee 
Instance details

Defined in LndClient.Data.FundPsbt

Methods

compare :: Fee -> Fee -> Ordering #

(<) :: Fee -> Fee -> Bool #

(<=) :: Fee -> Fee -> Bool #

(>) :: Fee -> Fee -> Bool #

(>=) :: Fee -> Fee -> Bool #

max :: Fee -> Fee -> Fee #

min :: Fee -> Fee -> Fee #

Ord FundPsbtRequest 
Instance details

Defined in LndClient.Data.FundPsbt

Methods

compare :: FundPsbtRequest -> FundPsbtRequest -> Ordering #

(<) :: FundPsbtRequest -> FundPsbtRequest -> Bool #

(<=) :: FundPsbtRequest -> FundPsbtRequest -> Bool #

(>) :: FundPsbtRequest -> FundPsbtRequest -> Bool #

(>=) :: FundPsbtRequest -> FundPsbtRequest -> Bool #

max :: FundPsbtRequest -> FundPsbtRequest -> FundPsbtRequest #

min :: FundPsbtRequest -> FundPsbtRequest -> FundPsbtRequest #

Ord FundPsbtResponse 
Instance details

Defined in LndClient.Data.FundPsbt

Methods

compare :: FundPsbtResponse -> FundPsbtResponse -> Ordering #

(<) :: FundPsbtResponse -> FundPsbtResponse -> Bool #

(<=) :: FundPsbtResponse -> FundPsbtResponse -> Bool #

(>) :: FundPsbtResponse -> FundPsbtResponse -> Bool #

(>=) :: FundPsbtResponse -> FundPsbtResponse -> Bool #

max :: FundPsbtResponse -> FundPsbtResponse -> FundPsbtResponse #

min :: FundPsbtResponse -> FundPsbtResponse -> FundPsbtResponse #

Ord TxTemplate 
Instance details

Defined in LndClient.Data.FundPsbt

Methods

compare :: TxTemplate -> TxTemplate -> Ordering #

(<) :: TxTemplate -> TxTemplate -> Bool #

(<=) :: TxTemplate -> TxTemplate -> Bool #

(>) :: TxTemplate -> TxTemplate -> Bool #

(>=) :: TxTemplate -> TxTemplate -> Bool #

max :: TxTemplate -> TxTemplate -> TxTemplate #

min :: TxTemplate -> TxTemplate -> TxTemplate #

Ord UtxoLease 
Instance details

Defined in LndClient.Data.FundPsbt

Methods

compare :: UtxoLease -> UtxoLease -> Ordering #

(<) :: UtxoLease -> UtxoLease -> Bool #

(<=) :: UtxoLease -> UtxoLease -> Bool #

(>) :: UtxoLease -> UtxoLease -> Bool #

(>=) :: UtxoLease -> UtxoLease -> Bool #

max :: UtxoLease -> UtxoLease -> UtxoLease #

min :: UtxoLease -> UtxoLease -> UtxoLease #

Ord FundingPsbtFinalize 
Instance details

Defined in LndClient.Data.FundingPsbtFinalize

Methods

compare :: FundingPsbtFinalize -> FundingPsbtFinalize -> Ordering #

(<) :: FundingPsbtFinalize -> FundingPsbtFinalize -> Bool #

(<=) :: FundingPsbtFinalize -> FundingPsbtFinalize -> Bool #

(>) :: FundingPsbtFinalize -> FundingPsbtFinalize -> Bool #

(>=) :: FundingPsbtFinalize -> FundingPsbtFinalize -> Bool #

max :: FundingPsbtFinalize -> FundingPsbtFinalize -> FundingPsbtFinalize #

min :: FundingPsbtFinalize -> FundingPsbtFinalize -> FundingPsbtFinalize #

Ord FundingPsbtVerify 
Instance details

Defined in LndClient.Data.FundingPsbtVerify

Methods

compare :: FundingPsbtVerify -> FundingPsbtVerify -> Ordering #

(<) :: FundingPsbtVerify -> FundingPsbtVerify -> Bool #

(<=) :: FundingPsbtVerify -> FundingPsbtVerify -> Bool #

(>) :: FundingPsbtVerify -> FundingPsbtVerify -> Bool #

(>=) :: FundingPsbtVerify -> FundingPsbtVerify -> Bool #

max :: FundingPsbtVerify -> FundingPsbtVerify -> FundingPsbtVerify #

min :: FundingPsbtVerify -> FundingPsbtVerify -> FundingPsbtVerify #

Ord ChanPointShim 
Instance details

Defined in LndClient.Data.FundingShim

Methods

compare :: ChanPointShim -> ChanPointShim -> Ordering #

(<) :: ChanPointShim -> ChanPointShim -> Bool #

(<=) :: ChanPointShim -> ChanPointShim -> Bool #

(>) :: ChanPointShim -> ChanPointShim -> Bool #

(>=) :: ChanPointShim -> ChanPointShim -> Bool #

max :: ChanPointShim -> ChanPointShim -> ChanPointShim #

min :: ChanPointShim -> ChanPointShim -> ChanPointShim #

Ord FundingShim 
Instance details

Defined in LndClient.Data.FundingShim

Methods

compare :: FundingShim -> FundingShim -> Ordering #

(<) :: FundingShim -> FundingShim -> Bool #

(<=) :: FundingShim -> FundingShim -> Bool #

(>) :: FundingShim -> FundingShim -> Bool #

(>=) :: FundingShim -> FundingShim -> Bool #

max :: FundingShim -> FundingShim -> FundingShim #

min :: FundingShim -> FundingShim -> FundingShim #

Ord KeyDescriptor 
Instance details

Defined in LndClient.Data.FundingShim

Methods

compare :: KeyDescriptor -> KeyDescriptor -> Ordering #

(<) :: KeyDescriptor -> KeyDescriptor -> Bool #

(<=) :: KeyDescriptor -> KeyDescriptor -> Bool #

(>) :: KeyDescriptor -> KeyDescriptor -> Bool #

(>=) :: KeyDescriptor -> KeyDescriptor -> Bool #

max :: KeyDescriptor -> KeyDescriptor -> KeyDescriptor #

min :: KeyDescriptor -> KeyDescriptor -> KeyDescriptor #

Ord FundingShimCancel 
Instance details

Defined in LndClient.Data.FundingShimCancel

Methods

compare :: FundingShimCancel -> FundingShimCancel -> Ordering #

(<) :: FundingShimCancel -> FundingShimCancel -> Bool #

(<=) :: FundingShimCancel -> FundingShimCancel -> Bool #

(>) :: FundingShimCancel -> FundingShimCancel -> Bool #

(>=) :: FundingShimCancel -> FundingShimCancel -> Bool #

max :: FundingShimCancel -> FundingShimCancel -> FundingShimCancel #

min :: FundingShimCancel -> FundingShimCancel -> FundingShimCancel #

Ord FundingStateStepRequest 
Instance details

Defined in LndClient.Data.FundingStateStep

Methods

compare :: FundingStateStepRequest -> FundingStateStepRequest -> Ordering #

(<) :: FundingStateStepRequest -> FundingStateStepRequest -> Bool #

(<=) :: FundingStateStepRequest -> FundingStateStepRequest -> Bool #

(>) :: FundingStateStepRequest -> FundingStateStepRequest -> Bool #

(>=) :: FundingStateStepRequest -> FundingStateStepRequest -> Bool #

max :: FundingStateStepRequest -> FundingStateStepRequest -> FundingStateStepRequest #

min :: FundingStateStepRequest -> FundingStateStepRequest -> FundingStateStepRequest #

Ord LeaseOutputRequest 
Instance details

Defined in LndClient.Data.LeaseOutput

Methods

compare :: LeaseOutputRequest -> LeaseOutputRequest -> Ordering #

(<) :: LeaseOutputRequest -> LeaseOutputRequest -> Bool #

(<=) :: LeaseOutputRequest -> LeaseOutputRequest -> Bool #

(>) :: LeaseOutputRequest -> LeaseOutputRequest -> Bool #

(>=) :: LeaseOutputRequest -> LeaseOutputRequest -> Bool #

max :: LeaseOutputRequest -> LeaseOutputRequest -> LeaseOutputRequest #

min :: LeaseOutputRequest -> LeaseOutputRequest -> LeaseOutputRequest #

Ord LeaseOutputResponse 
Instance details

Defined in LndClient.Data.LeaseOutput

Methods

compare :: LeaseOutputResponse -> LeaseOutputResponse -> Ordering #

(<) :: LeaseOutputResponse -> LeaseOutputResponse -> Bool #

(<=) :: LeaseOutputResponse -> LeaseOutputResponse -> Bool #

(>) :: LeaseOutputResponse -> LeaseOutputResponse -> Bool #

(>=) :: LeaseOutputResponse -> LeaseOutputResponse -> Bool #

max :: LeaseOutputResponse -> LeaseOutputResponse -> LeaseOutputResponse #

min :: LeaseOutputResponse -> LeaseOutputResponse -> LeaseOutputResponse #

Ord ListLeasesRequest 
Instance details

Defined in LndClient.Data.ListLeases

Methods

compare :: ListLeasesRequest -> ListLeasesRequest -> Ordering #

(<) :: ListLeasesRequest -> ListLeasesRequest -> Bool #

(<=) :: ListLeasesRequest -> ListLeasesRequest -> Bool #

(>) :: ListLeasesRequest -> ListLeasesRequest -> Bool #

(>=) :: ListLeasesRequest -> ListLeasesRequest -> Bool #

max :: ListLeasesRequest -> ListLeasesRequest -> ListLeasesRequest #

min :: ListLeasesRequest -> ListLeasesRequest -> ListLeasesRequest #

Ord ListLeasesResponse 
Instance details

Defined in LndClient.Data.ListLeases

Methods

compare :: ListLeasesResponse -> ListLeasesResponse -> Ordering #

(<) :: ListLeasesResponse -> ListLeasesResponse -> Bool #

(<=) :: ListLeasesResponse -> ListLeasesResponse -> Bool #

(>) :: ListLeasesResponse -> ListLeasesResponse -> Bool #

(>=) :: ListLeasesResponse -> ListLeasesResponse -> Bool #

max :: ListLeasesResponse -> ListLeasesResponse -> ListLeasesResponse #

min :: ListLeasesResponse -> ListLeasesResponse -> ListLeasesResponse #

Ord UtxoLease 
Instance details

Defined in LndClient.Data.ListLeases

Methods

compare :: UtxoLease -> UtxoLease -> Ordering #

(<) :: UtxoLease -> UtxoLease -> Bool #

(<=) :: UtxoLease -> UtxoLease -> Bool #

(>) :: UtxoLease -> UtxoLease -> Bool #

(>=) :: UtxoLease -> UtxoLease -> Bool #

max :: UtxoLease -> UtxoLease -> UtxoLease #

min :: UtxoLease -> UtxoLease -> UtxoLease #

Ord ListUnspentRequest 
Instance details

Defined in LndClient.Data.ListUnspent

Methods

compare :: ListUnspentRequest -> ListUnspentRequest -> Ordering #

(<) :: ListUnspentRequest -> ListUnspentRequest -> Bool #

(<=) :: ListUnspentRequest -> ListUnspentRequest -> Bool #

(>) :: ListUnspentRequest -> ListUnspentRequest -> Bool #

(>=) :: ListUnspentRequest -> ListUnspentRequest -> Bool #

max :: ListUnspentRequest -> ListUnspentRequest -> ListUnspentRequest #

min :: ListUnspentRequest -> ListUnspentRequest -> ListUnspentRequest #

Ord ListUnspentResponse 
Instance details

Defined in LndClient.Data.ListUnspent

Methods

compare :: ListUnspentResponse -> ListUnspentResponse -> Ordering #

(<) :: ListUnspentResponse -> ListUnspentResponse -> Bool #

(<=) :: ListUnspentResponse -> ListUnspentResponse -> Bool #

(>) :: ListUnspentResponse -> ListUnspentResponse -> Bool #

(>=) :: ListUnspentResponse -> ListUnspentResponse -> Bool #

max :: ListUnspentResponse -> ListUnspentResponse -> ListUnspentResponse #

min :: ListUnspentResponse -> ListUnspentResponse -> ListUnspentResponse #

Ord Utxo 
Instance details

Defined in LndClient.Data.ListUnspent

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 AddressType 
Instance details

Defined in LndClient.Data.NewAddress

Methods

compare :: AddressType -> AddressType -> Ordering #

(<) :: AddressType -> AddressType -> Bool #

(<=) :: AddressType -> AddressType -> Bool #

(>) :: AddressType -> AddressType -> Bool #

(>=) :: AddressType -> AddressType -> Bool #

max :: AddressType -> AddressType -> AddressType #

min :: AddressType -> AddressType -> AddressType #

Ord AddIndex 
Instance details

Defined in LndClient.Data.Newtype

Methods

compare :: AddIndex -> AddIndex -> Ordering #

(<) :: AddIndex -> AddIndex -> Bool #

(<=) :: AddIndex -> AddIndex -> Bool #

(>) :: AddIndex -> AddIndex -> Bool #

(>=) :: AddIndex -> AddIndex -> Bool #

max :: AddIndex -> AddIndex -> AddIndex #

min :: AddIndex -> AddIndex -> AddIndex #

Ord ChanId 
Instance details

Defined in LndClient.Data.Newtype

Ord GrpcTimeoutSeconds 
Instance details

Defined in LndClient.Data.Newtype

Methods

compare :: GrpcTimeoutSeconds -> GrpcTimeoutSeconds -> Ordering #

(<) :: GrpcTimeoutSeconds -> GrpcTimeoutSeconds -> Bool #

(<=) :: GrpcTimeoutSeconds -> GrpcTimeoutSeconds -> Bool #

(>) :: GrpcTimeoutSeconds -> GrpcTimeoutSeconds -> Bool #

(>=) :: GrpcTimeoutSeconds -> GrpcTimeoutSeconds -> Bool #

max :: GrpcTimeoutSeconds -> GrpcTimeoutSeconds -> GrpcTimeoutSeconds #

min :: GrpcTimeoutSeconds -> GrpcTimeoutSeconds -> GrpcTimeoutSeconds #

Ord MSat 
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 NodeLocation 
Instance details

Defined in LndClient.Data.Newtype

Methods

compare :: NodeLocation -> NodeLocation -> Ordering #

(<) :: NodeLocation -> NodeLocation -> Bool #

(<=) :: NodeLocation -> NodeLocation -> Bool #

(>) :: NodeLocation -> NodeLocation -> Bool #

(>=) :: NodeLocation -> NodeLocation -> Bool #

max :: NodeLocation -> NodeLocation -> NodeLocation #

min :: NodeLocation -> NodeLocation -> NodeLocation #

Ord NodePubKey 
Instance details

Defined in LndClient.Data.Newtype

Ord PendingChannelId 
Instance details

Defined in LndClient.Data.Newtype

Methods

compare :: PendingChannelId -> PendingChannelId -> Ordering #

(<) :: PendingChannelId -> PendingChannelId -> Bool #

(<=) :: PendingChannelId -> PendingChannelId -> Bool #

(>) :: PendingChannelId -> PendingChannelId -> Bool #

(>=) :: PendingChannelId -> PendingChannelId -> Bool #

max :: PendingChannelId -> PendingChannelId -> PendingChannelId #

min :: PendingChannelId -> PendingChannelId -> PendingChannelId #

Ord Psbt 
Instance details

Defined in LndClient.Data.Newtype

Methods

compare :: Psbt -> Psbt -> Ordering #

(<) :: Psbt -> Psbt -> Bool #

(<=) :: Psbt -> Psbt -> Bool #

(>) :: Psbt -> Psbt -> Bool #

(>=) :: Psbt -> Psbt -> Bool #

max :: Psbt -> Psbt -> Psbt #

min :: Psbt -> Psbt -> Psbt #

Ord RHash 
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 RPreimage 
Instance details

Defined in LndClient.Data.Newtype

Ord RawTx 
Instance details

Defined in LndClient.Data.Newtype

Methods

compare :: RawTx -> RawTx -> Ordering #

(<) :: RawTx -> RawTx -> Bool #

(<=) :: RawTx -> RawTx -> Bool #

(>) :: RawTx -> RawTx -> Bool #

(>=) :: RawTx -> RawTx -> Bool #

max :: RawTx -> RawTx -> RawTx #

min :: RawTx -> RawTx -> RawTx #

Ord Seconds 
Instance details

Defined in LndClient.Data.Newtype

Methods

compare :: Seconds -> Seconds -> Ordering #

(<) :: Seconds -> Seconds -> Bool #

(<=) :: Seconds -> Seconds -> Bool #

(>) :: Seconds -> Seconds -> Bool #

(>=) :: Seconds -> Seconds -> Bool #

max :: Seconds -> Seconds -> Seconds #

min :: Seconds -> Seconds -> Seconds #

Ord SettleIndex 
Instance details

Defined in LndClient.Data.Newtype

Methods

compare :: SettleIndex -> SettleIndex -> Ordering #

(<) :: SettleIndex -> SettleIndex -> Bool #

(<=) :: SettleIndex -> SettleIndex -> Bool #

(>) :: SettleIndex -> SettleIndex -> Bool #

(>=) :: SettleIndex -> SettleIndex -> Bool #

max :: SettleIndex -> SettleIndex -> SettleIndex #

min :: SettleIndex -> SettleIndex -> SettleIndex #

Ord OutPoint 
Instance details

Defined in LndClient.Data.OutPoint

Methods

compare :: OutPoint -> OutPoint -> Ordering #

(<) :: OutPoint -> OutPoint -> Bool #

(<=) :: OutPoint -> OutPoint -> Bool #

(>) :: OutPoint -> OutPoint -> Bool #

(>=) :: OutPoint -> OutPoint -> Bool #

max :: OutPoint -> OutPoint -> OutPoint #

min :: OutPoint -> OutPoint -> OutPoint #

Ord PsbtShim 
Instance details

Defined in LndClient.Data.PsbtShim

Methods

compare :: PsbtShim -> PsbtShim -> Ordering #

(<) :: PsbtShim -> PsbtShim -> Bool #

(<=) :: PsbtShim -> PsbtShim -> Bool #

(>) :: PsbtShim -> PsbtShim -> Bool #

(>=) :: PsbtShim -> PsbtShim -> Bool #

max :: PsbtShim -> PsbtShim -> PsbtShim #

min :: PsbtShim -> PsbtShim -> PsbtShim #

Ord PublishTransactionRequest 
Instance details

Defined in LndClient.Data.PublishTransaction

Methods

compare :: PublishTransactionRequest -> PublishTransactionRequest -> Ordering #

(<) :: PublishTransactionRequest -> PublishTransactionRequest -> Bool #

(<=) :: PublishTransactionRequest -> PublishTransactionRequest -> Bool #

(>) :: PublishTransactionRequest -> PublishTransactionRequest -> Bool #

(>=) :: PublishTransactionRequest -> PublishTransactionRequest -> Bool #

max :: PublishTransactionRequest -> PublishTransactionRequest -> PublishTransactionRequest #

min :: PublishTransactionRequest -> PublishTransactionRequest -> PublishTransactionRequest #

Ord PublishTransactionResponse 
Instance details

Defined in LndClient.Data.PublishTransaction

Methods

compare :: PublishTransactionResponse -> PublishTransactionResponse -> Ordering #

(<) :: PublishTransactionResponse -> PublishTransactionResponse -> Bool #

(<=) :: PublishTransactionResponse -> PublishTransactionResponse -> Bool #

(>) :: PublishTransactionResponse -> PublishTransactionResponse -> Bool #

(>=) :: PublishTransactionResponse -> PublishTransactionResponse -> Bool #

max :: PublishTransactionResponse -> PublishTransactionResponse -> PublishTransactionResponse #

min :: PublishTransactionResponse -> PublishTransactionResponse -> PublishTransactionResponse #

Ord ReleaseOutputRequest 
Instance details

Defined in LndClient.Data.ReleaseOutput

Methods

compare :: ReleaseOutputRequest -> ReleaseOutputRequest -> Ordering #

(<) :: ReleaseOutputRequest -> ReleaseOutputRequest -> Bool #

(<=) :: ReleaseOutputRequest -> ReleaseOutputRequest -> Bool #

(>) :: ReleaseOutputRequest -> ReleaseOutputRequest -> Bool #

(>=) :: ReleaseOutputRequest -> ReleaseOutputRequest -> Bool #

max :: ReleaseOutputRequest -> ReleaseOutputRequest -> ReleaseOutputRequest #

min :: ReleaseOutputRequest -> ReleaseOutputRequest -> ReleaseOutputRequest #

Ord ReleaseOutputResponse 
Instance details

Defined in LndClient.Data.ReleaseOutput

Methods

compare :: ReleaseOutputResponse -> ReleaseOutputResponse -> Ordering #

(<) :: ReleaseOutputResponse -> ReleaseOutputResponse -> Bool #

(<=) :: ReleaseOutputResponse -> ReleaseOutputResponse -> Bool #

(>) :: ReleaseOutputResponse -> ReleaseOutputResponse -> Bool #

(>=) :: ReleaseOutputResponse -> ReleaseOutputResponse -> Bool #

max :: ReleaseOutputResponse -> ReleaseOutputResponse -> ReleaseOutputResponse #

min :: ReleaseOutputResponse -> ReleaseOutputResponse -> ReleaseOutputResponse #

Ord KeyLocator 
Instance details

Defined in LndClient.Data.SignMessage

Methods

compare :: KeyLocator -> KeyLocator -> Ordering #

(<) :: KeyLocator -> KeyLocator -> Bool #

(<=) :: KeyLocator -> KeyLocator -> Bool #

(>) :: KeyLocator -> KeyLocator -> Bool #

(>=) :: KeyLocator -> KeyLocator -> Bool #

max :: KeyLocator -> KeyLocator -> KeyLocator #

min :: KeyLocator -> KeyLocator -> KeyLocator #

Ord ChannelEventUpdate 
Instance details

Defined in LndClient.Data.SubscribeChannelEvents

Methods

compare :: ChannelEventUpdate -> ChannelEventUpdate -> Ordering #

(<) :: ChannelEventUpdate -> ChannelEventUpdate -> Bool #

(<=) :: ChannelEventUpdate -> ChannelEventUpdate -> Bool #

(>) :: ChannelEventUpdate -> ChannelEventUpdate -> Bool #

(>=) :: ChannelEventUpdate -> ChannelEventUpdate -> Bool #

max :: ChannelEventUpdate -> ChannelEventUpdate -> ChannelEventUpdate #

min :: ChannelEventUpdate -> ChannelEventUpdate -> ChannelEventUpdate #

Ord UpdateChannel 
Instance details

Defined in LndClient.Data.SubscribeChannelEvents

Methods

compare :: UpdateChannel -> UpdateChannel -> Ordering #

(<) :: UpdateChannel -> UpdateChannel -> Bool #

(<=) :: UpdateChannel -> UpdateChannel -> Bool #

(>) :: UpdateChannel -> UpdateChannel -> Bool #

(>=) :: UpdateChannel -> UpdateChannel -> Bool #

max :: UpdateChannel -> UpdateChannel -> UpdateChannel #

min :: UpdateChannel -> UpdateChannel -> UpdateChannel #

Ord UpdateType 
Instance details

Defined in LndClient.Data.SubscribeChannelEvents

Methods

compare :: UpdateType -> UpdateType -> Ordering #

(<) :: UpdateType -> UpdateType -> Bool #

(<=) :: UpdateType -> UpdateType -> Bool #

(>) :: UpdateType -> UpdateType -> Bool #

(>=) :: UpdateType -> UpdateType -> Bool #

max :: UpdateType -> UpdateType -> UpdateType #

min :: UpdateType -> UpdateType -> UpdateType #

Ord SubscribeInvoicesRequest 
Instance details

Defined in LndClient.Data.SubscribeInvoices

Methods

compare :: SubscribeInvoicesRequest -> SubscribeInvoicesRequest -> Ordering #

(<) :: SubscribeInvoicesRequest -> SubscribeInvoicesRequest -> Bool #

(<=) :: SubscribeInvoicesRequest -> SubscribeInvoicesRequest -> Bool #

(>) :: SubscribeInvoicesRequest -> SubscribeInvoicesRequest -> Bool #

(>=) :: SubscribeInvoicesRequest -> SubscribeInvoicesRequest -> Bool #

max :: SubscribeInvoicesRequest -> SubscribeInvoicesRequest -> SubscribeInvoicesRequest #

min :: SubscribeInvoicesRequest -> SubscribeInvoicesRequest -> SubscribeInvoicesRequest #

Ord TrackPaymentRequest 
Instance details

Defined in LndClient.Data.TrackPayment

Methods

compare :: TrackPaymentRequest -> TrackPaymentRequest -> Ordering #

(<) :: TrackPaymentRequest -> TrackPaymentRequest -> Bool #

(<=) :: TrackPaymentRequest -> TrackPaymentRequest -> Bool #

(>) :: TrackPaymentRequest -> TrackPaymentRequest -> Bool #

(>=) :: TrackPaymentRequest -> TrackPaymentRequest -> Bool #

max :: TrackPaymentRequest -> TrackPaymentRequest -> TrackPaymentRequest #

min :: TrackPaymentRequest -> TrackPaymentRequest -> TrackPaymentRequest #

Ord LnInitiator 
Instance details

Defined in LndClient.Data.Type

Methods

compare :: LnInitiator -> LnInitiator -> Ordering #

(<) :: LnInitiator -> LnInitiator -> Bool #

(<=) :: LnInitiator -> LnInitiator -> Bool #

(>) :: LnInitiator -> LnInitiator -> Bool #

(>=) :: LnInitiator -> LnInitiator -> Bool #

max :: LnInitiator -> LnInitiator -> LnInitiator #

min :: LnInitiator -> LnInitiator -> LnInitiator #

Ord LoggingMeta 
Instance details

Defined in LndClient.Data.Type

Methods

compare :: LoggingMeta -> LoggingMeta -> Ordering #

(<) :: LoggingMeta -> LoggingMeta -> Bool #

(<=) :: LoggingMeta -> LoggingMeta -> Bool #

(>) :: LoggingMeta -> LoggingMeta -> Bool #

(>=) :: LoggingMeta -> LoggingMeta -> Bool #

max :: LoggingMeta -> LoggingMeta -> LoggingMeta #

min :: LoggingMeta -> LoggingMeta -> LoggingMeta #

Ord WalletBalance 
Instance details

Defined in LndClient.Data.WalletBalance

Methods

compare :: WalletBalance -> WalletBalance -> Ordering #

(<) :: WalletBalance -> WalletBalance -> Bool #

(<=) :: WalletBalance -> WalletBalance -> Bool #

(>) :: WalletBalance -> WalletBalance -> Bool #

(>=) :: WalletBalance -> WalletBalance -> Bool #

max :: WalletBalance -> WalletBalance -> WalletBalance #

min :: WalletBalance -> WalletBalance -> WalletBalance #

Ord AddHoldInvoiceRequest 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

compare :: AddHoldInvoiceRequest -> AddHoldInvoiceRequest -> Ordering #

(<) :: AddHoldInvoiceRequest -> AddHoldInvoiceRequest -> Bool #

(<=) :: AddHoldInvoiceRequest -> AddHoldInvoiceRequest -> Bool #

(>) :: AddHoldInvoiceRequest -> AddHoldInvoiceRequest -> Bool #

(>=) :: AddHoldInvoiceRequest -> AddHoldInvoiceRequest -> Bool #

max :: AddHoldInvoiceRequest -> AddHoldInvoiceRequest -> AddHoldInvoiceRequest #

min :: AddHoldInvoiceRequest -> AddHoldInvoiceRequest -> AddHoldInvoiceRequest #

Ord AddHoldInvoiceResp 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

compare :: AddHoldInvoiceResp -> AddHoldInvoiceResp -> Ordering #

(<) :: AddHoldInvoiceResp -> AddHoldInvoiceResp -> Bool #

(<=) :: AddHoldInvoiceResp -> AddHoldInvoiceResp -> Bool #

(>) :: AddHoldInvoiceResp -> AddHoldInvoiceResp -> Bool #

(>=) :: AddHoldInvoiceResp -> AddHoldInvoiceResp -> Bool #

max :: AddHoldInvoiceResp -> AddHoldInvoiceResp -> AddHoldInvoiceResp #

min :: AddHoldInvoiceResp -> AddHoldInvoiceResp -> AddHoldInvoiceResp #

Ord CancelInvoiceMsg 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

compare :: CancelInvoiceMsg -> CancelInvoiceMsg -> Ordering #

(<) :: CancelInvoiceMsg -> CancelInvoiceMsg -> Bool #

(<=) :: CancelInvoiceMsg -> CancelInvoiceMsg -> Bool #

(>) :: CancelInvoiceMsg -> CancelInvoiceMsg -> Bool #

(>=) :: CancelInvoiceMsg -> CancelInvoiceMsg -> Bool #

max :: CancelInvoiceMsg -> CancelInvoiceMsg -> CancelInvoiceMsg #

min :: CancelInvoiceMsg -> CancelInvoiceMsg -> CancelInvoiceMsg #

Ord CancelInvoiceResp 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

compare :: CancelInvoiceResp -> CancelInvoiceResp -> Ordering #

(<) :: CancelInvoiceResp -> CancelInvoiceResp -> Bool #

(<=) :: CancelInvoiceResp -> CancelInvoiceResp -> Bool #

(>) :: CancelInvoiceResp -> CancelInvoiceResp -> Bool #

(>=) :: CancelInvoiceResp -> CancelInvoiceResp -> Bool #

max :: CancelInvoiceResp -> CancelInvoiceResp -> CancelInvoiceResp #

min :: CancelInvoiceResp -> CancelInvoiceResp -> CancelInvoiceResp #

Ord LookupInvoiceMsg 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

compare :: LookupInvoiceMsg -> LookupInvoiceMsg -> Ordering #

(<) :: LookupInvoiceMsg -> LookupInvoiceMsg -> Bool #

(<=) :: LookupInvoiceMsg -> LookupInvoiceMsg -> Bool #

(>) :: LookupInvoiceMsg -> LookupInvoiceMsg -> Bool #

(>=) :: LookupInvoiceMsg -> LookupInvoiceMsg -> Bool #

max :: LookupInvoiceMsg -> LookupInvoiceMsg -> LookupInvoiceMsg #

min :: LookupInvoiceMsg -> LookupInvoiceMsg -> LookupInvoiceMsg #

Ord LookupInvoiceMsg'InvoiceRef 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

compare :: LookupInvoiceMsg'InvoiceRef -> LookupInvoiceMsg'InvoiceRef -> Ordering #

(<) :: LookupInvoiceMsg'InvoiceRef -> LookupInvoiceMsg'InvoiceRef -> Bool #

(<=) :: LookupInvoiceMsg'InvoiceRef -> LookupInvoiceMsg'InvoiceRef -> Bool #

(>) :: LookupInvoiceMsg'InvoiceRef -> LookupInvoiceMsg'InvoiceRef -> Bool #

(>=) :: LookupInvoiceMsg'InvoiceRef -> LookupInvoiceMsg'InvoiceRef -> Bool #

max :: LookupInvoiceMsg'InvoiceRef -> LookupInvoiceMsg'InvoiceRef -> LookupInvoiceMsg'InvoiceRef #

min :: LookupInvoiceMsg'InvoiceRef -> LookupInvoiceMsg'InvoiceRef -> LookupInvoiceMsg'InvoiceRef #

Ord LookupModifier 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

compare :: LookupModifier -> LookupModifier -> Ordering #

(<) :: LookupModifier -> LookupModifier -> Bool #

(<=) :: LookupModifier -> LookupModifier -> Bool #

(>) :: LookupModifier -> LookupModifier -> Bool #

(>=) :: LookupModifier -> LookupModifier -> Bool #

max :: LookupModifier -> LookupModifier -> LookupModifier #

min :: LookupModifier -> LookupModifier -> LookupModifier #

Ord LookupModifier'UnrecognizedValue 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

compare :: LookupModifier'UnrecognizedValue -> LookupModifier'UnrecognizedValue -> Ordering #

(<) :: LookupModifier'UnrecognizedValue -> LookupModifier'UnrecognizedValue -> Bool #

(<=) :: LookupModifier'UnrecognizedValue -> LookupModifier'UnrecognizedValue -> Bool #

(>) :: LookupModifier'UnrecognizedValue -> LookupModifier'UnrecognizedValue -> Bool #

(>=) :: LookupModifier'UnrecognizedValue -> LookupModifier'UnrecognizedValue -> Bool #

max :: LookupModifier'UnrecognizedValue -> LookupModifier'UnrecognizedValue -> LookupModifier'UnrecognizedValue #

min :: LookupModifier'UnrecognizedValue -> LookupModifier'UnrecognizedValue -> LookupModifier'UnrecognizedValue #

Ord SettleInvoiceMsg 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

compare :: SettleInvoiceMsg -> SettleInvoiceMsg -> Ordering #

(<) :: SettleInvoiceMsg -> SettleInvoiceMsg -> Bool #

(<=) :: SettleInvoiceMsg -> SettleInvoiceMsg -> Bool #

(>) :: SettleInvoiceMsg -> SettleInvoiceMsg -> Bool #

(>=) :: SettleInvoiceMsg -> SettleInvoiceMsg -> Bool #

max :: SettleInvoiceMsg -> SettleInvoiceMsg -> SettleInvoiceMsg #

min :: SettleInvoiceMsg -> SettleInvoiceMsg -> SettleInvoiceMsg #

Ord SettleInvoiceResp 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

compare :: SettleInvoiceResp -> SettleInvoiceResp -> Ordering #

(<) :: SettleInvoiceResp -> SettleInvoiceResp -> Bool #

(<=) :: SettleInvoiceResp -> SettleInvoiceResp -> Bool #

(>) :: SettleInvoiceResp -> SettleInvoiceResp -> Bool #

(>=) :: SettleInvoiceResp -> SettleInvoiceResp -> Bool #

max :: SettleInvoiceResp -> SettleInvoiceResp -> SettleInvoiceResp #

min :: SettleInvoiceResp -> SettleInvoiceResp -> SettleInvoiceResp #

Ord SubscribeSingleInvoiceRequest 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

compare :: SubscribeSingleInvoiceRequest -> SubscribeSingleInvoiceRequest -> Ordering #

(<) :: SubscribeSingleInvoiceRequest -> SubscribeSingleInvoiceRequest -> Bool #

(<=) :: SubscribeSingleInvoiceRequest -> SubscribeSingleInvoiceRequest -> Bool #

(>) :: SubscribeSingleInvoiceRequest -> SubscribeSingleInvoiceRequest -> Bool #

(>=) :: SubscribeSingleInvoiceRequest -> SubscribeSingleInvoiceRequest -> Bool #

max :: SubscribeSingleInvoiceRequest -> SubscribeSingleInvoiceRequest -> SubscribeSingleInvoiceRequest #

min :: SubscribeSingleInvoiceRequest -> SubscribeSingleInvoiceRequest -> SubscribeSingleInvoiceRequest #

Ord AddressType 
Instance details

Defined in Proto.Lightning

Methods

compare :: AddressType -> AddressType -> Ordering #

(<) :: AddressType -> AddressType -> Bool #

(<=) :: AddressType -> AddressType -> Bool #

(>) :: AddressType -> AddressType -> Bool #

(>=) :: AddressType -> AddressType -> Bool #

max :: AddressType -> AddressType -> AddressType #

min :: AddressType -> AddressType -> AddressType #

Ord AddressType'UnrecognizedValue 
Instance details

Defined in Proto.Lightning

Methods

compare :: AddressType'UnrecognizedValue -> AddressType'UnrecognizedValue -> Ordering #

(<) :: AddressType'UnrecognizedValue -> AddressType'UnrecognizedValue -> Bool #

(<=) :: AddressType'UnrecognizedValue -> AddressType'UnrecognizedValue -> Bool #

(>) :: AddressType'UnrecognizedValue -> AddressType'UnrecognizedValue -> Bool #

(>=) :: AddressType'UnrecognizedValue -> AddressType'UnrecognizedValue -> Bool #

max :: AddressType'UnrecognizedValue -> AddressType'UnrecognizedValue -> AddressType'UnrecognizedValue #

min :: AddressType'UnrecognizedValue -> AddressType'UnrecognizedValue -> AddressType'UnrecognizedValue #

Ord BatchOpenChannel 
Instance details

Defined in Proto.Lightning

Methods

compare :: BatchOpenChannel -> BatchOpenChannel -> Ordering #

(<) :: BatchOpenChannel -> BatchOpenChannel -> Bool #

(<=) :: BatchOpenChannel -> BatchOpenChannel -> Bool #

(>) :: BatchOpenChannel -> BatchOpenChannel -> Bool #

(>=) :: BatchOpenChannel -> BatchOpenChannel -> Bool #

max :: BatchOpenChannel -> BatchOpenChannel -> BatchOpenChannel #

min :: BatchOpenChannel -> BatchOpenChannel -> BatchOpenChannel #

Ord BatchOpenChannelRequest 
Instance details

Defined in Proto.Lightning

Methods

compare :: BatchOpenChannelRequest -> BatchOpenChannelRequest -> Ordering #

(<) :: BatchOpenChannelRequest -> BatchOpenChannelRequest -> Bool #

(<=) :: BatchOpenChannelRequest -> BatchOpenChannelRequest -> Bool #

(>) :: BatchOpenChannelRequest -> BatchOpenChannelRequest -> Bool #

(>=) :: BatchOpenChannelRequest -> BatchOpenChannelRequest -> Bool #

max :: BatchOpenChannelRequest -> BatchOpenChannelRequest -> BatchOpenChannelRequest #

min :: BatchOpenChannelRequest -> BatchOpenChannelRequest -> BatchOpenChannelRequest #

Ord BatchOpenChannelResponse 
Instance details

Defined in Proto.Lightning

Methods

compare :: BatchOpenChannelResponse -> BatchOpenChannelResponse -> Ordering #

(<) :: BatchOpenChannelResponse -> BatchOpenChannelResponse -> Bool #

(<=) :: BatchOpenChannelResponse -> BatchOpenChannelResponse -> Bool #

(>) :: BatchOpenChannelResponse -> BatchOpenChannelResponse -> Bool #

(>=) :: BatchOpenChannelResponse -> BatchOpenChannelResponse -> Bool #

max :: BatchOpenChannelResponse -> BatchOpenChannelResponse -> BatchOpenChannelResponse #

min :: BatchOpenChannelResponse -> BatchOpenChannelResponse -> BatchOpenChannelResponse #

Ord Chain 
Instance details

Defined in Proto.Lightning

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 ChannelAcceptRequest 
Instance details

Defined in Proto.Lightning

Methods

compare :: ChannelAcceptRequest -> ChannelAcceptRequest -> Ordering #

(<) :: ChannelAcceptRequest -> ChannelAcceptRequest -> Bool #

(<=) :: ChannelAcceptRequest -> ChannelAcceptRequest -> Bool #

(>) :: ChannelAcceptRequest -> ChannelAcceptRequest -> Bool #

(>=) :: ChannelAcceptRequest -> ChannelAcceptRequest -> Bool #

max :: ChannelAcceptRequest -> ChannelAcceptRequest -> ChannelAcceptRequest #

min :: ChannelAcceptRequest -> ChannelAcceptRequest -> ChannelAcceptRequest #

Ord ChannelAcceptResponse 
Instance details

Defined in Proto.Lightning

Methods

compare :: ChannelAcceptResponse -> ChannelAcceptResponse -> Ordering #

(<) :: ChannelAcceptResponse -> ChannelAcceptResponse -> Bool #

(<=) :: ChannelAcceptResponse -> ChannelAcceptResponse -> Bool #

(>) :: ChannelAcceptResponse -> ChannelAcceptResponse -> Bool #

(>=) :: ChannelAcceptResponse -> ChannelAcceptResponse -> Bool #

max :: ChannelAcceptResponse -> ChannelAcceptResponse -> ChannelAcceptResponse #

min :: ChannelAcceptResponse -> ChannelAcceptResponse -> ChannelAcceptResponse #

Ord ChannelCloseUpdate 
Instance details

Defined in Proto.Lightning

Methods

compare :: ChannelCloseUpdate -> ChannelCloseUpdate -> Ordering #

(<) :: ChannelCloseUpdate -> ChannelCloseUpdate -> Bool #

(<=) :: ChannelCloseUpdate -> ChannelCloseUpdate -> Bool #

(>) :: ChannelCloseUpdate -> ChannelCloseUpdate -> Bool #

(>=) :: ChannelCloseUpdate -> ChannelCloseUpdate -> Bool #

max :: ChannelCloseUpdate -> ChannelCloseUpdate -> ChannelCloseUpdate #

min :: ChannelCloseUpdate -> ChannelCloseUpdate -> ChannelCloseUpdate #

Ord ChannelOpenUpdate 
Instance details

Defined in Proto.Lightning

Methods

compare :: ChannelOpenUpdate -> ChannelOpenUpdate -> Ordering #

(<) :: ChannelOpenUpdate -> ChannelOpenUpdate -> Bool #

(<=) :: ChannelOpenUpdate -> ChannelOpenUpdate -> Bool #

(>) :: ChannelOpenUpdate -> ChannelOpenUpdate -> Bool #

(>=) :: ChannelOpenUpdate -> ChannelOpenUpdate -> Bool #

max :: ChannelOpenUpdate -> ChannelOpenUpdate -> ChannelOpenUpdate #

min :: ChannelOpenUpdate -> ChannelOpenUpdate -> ChannelOpenUpdate #

Ord CloseChannelRequest 
Instance details

Defined in Proto.Lightning

Methods

compare :: CloseChannelRequest -> CloseChannelRequest -> Ordering #

(<) :: CloseChannelRequest -> CloseChannelRequest -> Bool #

(<=) :: CloseChannelRequest -> CloseChannelRequest -> Bool #

(>) :: CloseChannelRequest -> CloseChannelRequest -> Bool #

(>=) :: CloseChannelRequest -> CloseChannelRequest -> Bool #

max :: CloseChannelRequest -> CloseChannelRequest -> CloseChannelRequest #

min :: CloseChannelRequest -> CloseChannelRequest -> CloseChannelRequest #

Ord CloseStatusUpdate 
Instance details

Defined in Proto.Lightning

Methods

compare :: CloseStatusUpdate -> CloseStatusUpdate -> Ordering #

(<) :: CloseStatusUpdate -> CloseStatusUpdate -> Bool #

(<=) :: CloseStatusUpdate -> CloseStatusUpdate -> Bool #

(>) :: CloseStatusUpdate -> CloseStatusUpdate -> Bool #

(>=) :: CloseStatusUpdate -> CloseStatusUpdate -> Bool #

max :: CloseStatusUpdate -> CloseStatusUpdate -> CloseStatusUpdate #

min :: CloseStatusUpdate -> CloseStatusUpdate -> CloseStatusUpdate #

Ord CloseStatusUpdate'Update 
Instance details

Defined in Proto.Lightning

Methods

compare :: CloseStatusUpdate'Update -> CloseStatusUpdate'Update -> Ordering #

(<) :: CloseStatusUpdate'Update -> CloseStatusUpdate'Update -> Bool #

(<=) :: CloseStatusUpdate'Update -> CloseStatusUpdate'Update -> Bool #

(>) :: CloseStatusUpdate'Update -> CloseStatusUpdate'Update -> Bool #

(>=) :: CloseStatusUpdate'Update -> CloseStatusUpdate'Update -> Bool #

max :: CloseStatusUpdate'Update -> CloseStatusUpdate'Update -> CloseStatusUpdate'Update #

min :: CloseStatusUpdate'Update -> CloseStatusUpdate'Update -> CloseStatusUpdate'Update #

Ord ClosedChannelsRequest 
Instance details

Defined in Proto.Lightning

Methods

compare :: ClosedChannelsRequest -> ClosedChannelsRequest -> Ordering #

(<) :: ClosedChannelsRequest -> ClosedChannelsRequest -> Bool #

(<=) :: ClosedChannelsRequest -> ClosedChannelsRequest -> Bool #

(>) :: ClosedChannelsRequest -> ClosedChannelsRequest -> Bool #

(>=) :: ClosedChannelsRequest -> ClosedChannelsRequest -> Bool #

max :: ClosedChannelsRequest -> ClosedChannelsRequest -> ClosedChannelsRequest #

min :: ClosedChannelsRequest -> ClosedChannelsRequest -> ClosedChannelsRequest #

Ord ClosedChannelsResponse 
Instance details

Defined in Proto.Lightning

Methods

compare :: ClosedChannelsResponse -> ClosedChannelsResponse -> Ordering #

(<) :: ClosedChannelsResponse -> ClosedChannelsResponse -> Bool #

(<=) :: ClosedChannelsResponse -> ClosedChannelsResponse -> Bool #

(>) :: ClosedChannelsResponse -> ClosedChannelsResponse -> Bool #

(>=) :: ClosedChannelsResponse -> ClosedChannelsResponse -> Bool #

max :: ClosedChannelsResponse -> ClosedChannelsResponse -> ClosedChannelsResponse #

min :: ClosedChannelsResponse -> ClosedChannelsResponse -> ClosedChannelsResponse #

Ord ConfirmationUpdate 
Instance details

Defined in Proto.Lightning

Methods

compare :: ConfirmationUpdate -> ConfirmationUpdate -> Ordering #

(<) :: ConfirmationUpdate -> ConfirmationUpdate -> Bool #

(<=) :: ConfirmationUpdate -> ConfirmationUpdate -> Bool #

(>) :: ConfirmationUpdate -> ConfirmationUpdate -> Bool #

(>=) :: ConfirmationUpdate -> ConfirmationUpdate -> Bool #

max :: ConfirmationUpdate -> ConfirmationUpdate -> ConfirmationUpdate #

min :: ConfirmationUpdate -> ConfirmationUpdate -> ConfirmationUpdate #

Ord ConnectPeerRequest 
Instance details

Defined in Proto.Lightning

Methods

compare :: ConnectPeerRequest -> ConnectPeerRequest -> Ordering #

(<) :: ConnectPeerRequest -> ConnectPeerRequest -> Bool #

(<=) :: ConnectPeerRequest -> ConnectPeerRequest -> Bool #

(>) :: ConnectPeerRequest -> ConnectPeerRequest -> Bool #

(>=) :: ConnectPeerRequest -> ConnectPeerRequest -> Bool #

max :: ConnectPeerRequest -> ConnectPeerRequest -> ConnectPeerRequest #

min :: ConnectPeerRequest -> ConnectPeerRequest -> ConnectPeerRequest #

Ord ConnectPeerResponse 
Instance details

Defined in Proto.Lightning

Methods

compare :: ConnectPeerResponse -> ConnectPeerResponse -> Ordering #

(<) :: ConnectPeerResponse -> ConnectPeerResponse -> Bool #

(<=) :: ConnectPeerResponse -> ConnectPeerResponse -> Bool #

(>) :: ConnectPeerResponse -> ConnectPeerResponse -> Bool #

(>=) :: ConnectPeerResponse -> ConnectPeerResponse -> Bool #

max :: ConnectPeerResponse -> ConnectPeerResponse -> ConnectPeerResponse #

min :: ConnectPeerResponse -> ConnectPeerResponse -> ConnectPeerResponse #

Ord CustomMessage 
Instance details

Defined in Proto.Lightning

Methods

compare :: CustomMessage -> CustomMessage -> Ordering #

(<) :: CustomMessage -> CustomMessage -> Bool #

(<=) :: CustomMessage -> CustomMessage -> Bool #

(>) :: CustomMessage -> CustomMessage -> Bool #

(>=) :: CustomMessage -> CustomMessage -> Bool #

max :: CustomMessage -> CustomMessage -> CustomMessage #

min :: CustomMessage -> CustomMessage -> CustomMessage #

Ord DisconnectPeerRequest 
Instance details

Defined in Proto.Lightning

Methods

compare :: DisconnectPeerRequest -> DisconnectPeerRequest -> Ordering #

(<) :: DisconnectPeerRequest -> DisconnectPeerRequest -> Bool #

(<=) :: DisconnectPeerRequest -> DisconnectPeerRequest -> Bool #

(>) :: DisconnectPeerRequest -> DisconnectPeerRequest -> Bool #

(>=) :: DisconnectPeerRequest -> DisconnectPeerRequest -> Bool #

max :: DisconnectPeerRequest -> DisconnectPeerRequest -> DisconnectPeerRequest #

min :: DisconnectPeerRequest -> DisconnectPeerRequest -> DisconnectPeerRequest #

Ord DisconnectPeerResponse 
Instance details

Defined in Proto.Lightning

Methods

compare :: DisconnectPeerResponse -> DisconnectPeerResponse -> Ordering #

(<) :: DisconnectPeerResponse -> DisconnectPeerResponse -> Bool #

(<=) :: DisconnectPeerResponse -> DisconnectPeerResponse -> Bool #

(>) :: DisconnectPeerResponse -> DisconnectPeerResponse -> Bool #

(>=) :: DisconnectPeerResponse -> DisconnectPeerResponse -> Bool #

max :: DisconnectPeerResponse -> DisconnectPeerResponse -> DisconnectPeerResponse #

min :: DisconnectPeerResponse -> DisconnectPeerResponse -> DisconnectPeerResponse #

Ord EstimateFeeRequest 
Instance details

Defined in Proto.Lightning

Methods

compare :: EstimateFeeRequest -> EstimateFeeRequest -> Ordering #

(<) :: EstimateFeeRequest -> EstimateFeeRequest -> Bool #

(<=) :: EstimateFeeRequest -> EstimateFeeRequest -> Bool #

(>) :: EstimateFeeRequest -> EstimateFeeRequest -> Bool #

(>=) :: EstimateFeeRequest -> EstimateFeeRequest -> Bool #

max :: EstimateFeeRequest -> EstimateFeeRequest -> EstimateFeeRequest #

min :: EstimateFeeRequest -> EstimateFeeRequest -> EstimateFeeRequest #

Ord EstimateFeeRequest'AddrToAmountEntry 
Instance details

Defined in Proto.Lightning

Methods

compare :: EstimateFeeRequest'AddrToAmountEntry -> EstimateFeeRequest'AddrToAmountEntry -> Ordering #

(<) :: EstimateFeeRequest'AddrToAmountEntry -> EstimateFeeRequest'AddrToAmountEntry -> Bool #

(<=) :: EstimateFeeRequest'AddrToAmountEntry -> EstimateFeeRequest'AddrToAmountEntry -> Bool #

(>) :: EstimateFeeRequest'AddrToAmountEntry -> EstimateFeeRequest'AddrToAmountEntry -> Bool #

(>=) :: EstimateFeeRequest'AddrToAmountEntry -> EstimateFeeRequest'AddrToAmountEntry -> Bool #

max :: EstimateFeeRequest'AddrToAmountEntry -> EstimateFeeRequest'AddrToAmountEntry -> EstimateFeeRequest'AddrToAmountEntry #

min :: EstimateFeeRequest'AddrToAmountEntry -> EstimateFeeRequest'AddrToAmountEntry -> EstimateFeeRequest'AddrToAmountEntry #

Ord EstimateFeeResponse 
Instance details

Defined in Proto.Lightning

Methods

compare :: EstimateFeeResponse -> EstimateFeeResponse -> Ordering #

(<) :: EstimateFeeResponse -> EstimateFeeResponse -> Bool #

(<=) :: EstimateFeeResponse -> EstimateFeeResponse -> Bool #

(>) :: EstimateFeeResponse -> EstimateFeeResponse -> Bool #

(>=) :: EstimateFeeResponse -> EstimateFeeResponse -> Bool #

max :: EstimateFeeResponse -> EstimateFeeResponse -> EstimateFeeResponse #

min :: EstimateFeeResponse -> EstimateFeeResponse -> EstimateFeeResponse #

Ord GetInfoRequest 
Instance details

Defined in Proto.Lightning

Methods

compare :: GetInfoRequest -> GetInfoRequest -> Ordering #

(<) :: GetInfoRequest -> GetInfoRequest -> Bool #

(<=) :: GetInfoRequest -> GetInfoRequest -> Bool #

(>) :: GetInfoRequest -> GetInfoRequest -> Bool #

(>=) :: GetInfoRequest -> GetInfoRequest -> Bool #

max :: GetInfoRequest -> GetInfoRequest -> GetInfoRequest #

min :: GetInfoRequest -> GetInfoRequest -> GetInfoRequest #

Ord GetInfoResponse 
Instance details

Defined in Proto.Lightning

Methods

compare :: GetInfoResponse -> GetInfoResponse -> Ordering #

(<) :: GetInfoResponse -> GetInfoResponse -> Bool #

(<=) :: GetInfoResponse -> GetInfoResponse -> Bool #

(>) :: GetInfoResponse -> GetInfoResponse -> Bool #

(>=) :: GetInfoResponse -> GetInfoResponse -> Bool #

max :: GetInfoResponse -> GetInfoResponse -> GetInfoResponse #

min :: GetInfoResponse -> GetInfoResponse -> GetInfoResponse #

Ord GetInfoResponse'FeaturesEntry 
Instance details

Defined in Proto.Lightning

Methods

compare :: GetInfoResponse'FeaturesEntry -> GetInfoResponse'FeaturesEntry -> Ordering #

(<) :: GetInfoResponse'FeaturesEntry -> GetInfoResponse'FeaturesEntry -> Bool #

(<=) :: GetInfoResponse'FeaturesEntry -> GetInfoResponse'FeaturesEntry -> Bool #

(>) :: GetInfoResponse'FeaturesEntry -> GetInfoResponse'FeaturesEntry -> Bool #

(>=) :: GetInfoResponse'FeaturesEntry -> GetInfoResponse'FeaturesEntry -> Bool #

max :: GetInfoResponse'FeaturesEntry -> GetInfoResponse'FeaturesEntry -> GetInfoResponse'FeaturesEntry #

min :: GetInfoResponse'FeaturesEntry -> GetInfoResponse'FeaturesEntry -> GetInfoResponse'FeaturesEntry #

Ord GetRecoveryInfoRequest 
Instance details

Defined in Proto.Lightning

Methods

compare :: GetRecoveryInfoRequest -> GetRecoveryInfoRequest -> Ordering #

(<) :: GetRecoveryInfoRequest -> GetRecoveryInfoRequest -> Bool #

(<=) :: GetRecoveryInfoRequest -> GetRecoveryInfoRequest -> Bool #

(>) :: GetRecoveryInfoRequest -> GetRecoveryInfoRequest -> Bool #

(>=) :: GetRecoveryInfoRequest -> GetRecoveryInfoRequest -> Bool #

max :: GetRecoveryInfoRequest -> GetRecoveryInfoRequest -> GetRecoveryInfoRequest #

min :: GetRecoveryInfoRequest -> GetRecoveryInfoRequest -> GetRecoveryInfoRequest #

Ord GetRecoveryInfoResponse 
Instance details

Defined in Proto.Lightning

Methods

compare :: GetRecoveryInfoResponse -> GetRecoveryInfoResponse -> Ordering #

(<) :: GetRecoveryInfoResponse -> GetRecoveryInfoResponse -> Bool #

(<=) :: GetRecoveryInfoResponse -> GetRecoveryInfoResponse -> Bool #

(>) :: GetRecoveryInfoResponse -> GetRecoveryInfoResponse -> Bool #

(>=) :: GetRecoveryInfoResponse -> GetRecoveryInfoResponse -> Bool #

max :: GetRecoveryInfoResponse -> GetRecoveryInfoResponse -> GetRecoveryInfoResponse #

min :: GetRecoveryInfoResponse -> GetRecoveryInfoResponse -> GetRecoveryInfoResponse #

Ord GetTransactionsRequest 
Instance details

Defined in Proto.Lightning

Methods

compare :: GetTransactionsRequest -> GetTransactionsRequest -> Ordering #

(<) :: GetTransactionsRequest -> GetTransactionsRequest -> Bool #

(<=) :: GetTransactionsRequest -> GetTransactionsRequest -> Bool #

(>) :: GetTransactionsRequest -> GetTransactionsRequest -> Bool #

(>=) :: GetTransactionsRequest -> GetTransactionsRequest -> Bool #

max :: GetTransactionsRequest -> GetTransactionsRequest -> GetTransactionsRequest #

min :: GetTransactionsRequest -> GetTransactionsRequest -> GetTransactionsRequest #

Ord LightningAddress 
Instance details

Defined in Proto.Lightning

Methods

compare :: LightningAddress -> LightningAddress -> Ordering #

(<) :: LightningAddress -> LightningAddress -> Bool #

(<=) :: LightningAddress -> LightningAddress -> Bool #

(>) :: LightningAddress -> LightningAddress -> Bool #

(>=) :: LightningAddress -> LightningAddress -> Bool #

max :: LightningAddress -> LightningAddress -> LightningAddress #

min :: LightningAddress -> LightningAddress -> LightningAddress #

Ord ListChannelsRequest 
Instance details

Defined in Proto.Lightning

Methods

compare :: ListChannelsRequest -> ListChannelsRequest -> Ordering #

(<) :: ListChannelsRequest -> ListChannelsRequest -> Bool #

(<=) :: ListChannelsRequest -> ListChannelsRequest -> Bool #

(>) :: ListChannelsRequest -> ListChannelsRequest -> Bool #

(>=) :: ListChannelsRequest -> ListChannelsRequest -> Bool #

max :: ListChannelsRequest -> ListChannelsRequest -> ListChannelsRequest #

min :: ListChannelsRequest -> ListChannelsRequest -> ListChannelsRequest #

Ord ListChannelsResponse 
Instance details

Defined in Proto.Lightning

Methods

compare :: ListChannelsResponse -> ListChannelsResponse -> Ordering #

(<) :: ListChannelsResponse -> ListChannelsResponse -> Bool #

(<=) :: ListChannelsResponse -> ListChannelsResponse -> Bool #

(>) :: ListChannelsResponse -> ListChannelsResponse -> Bool #

(>=) :: ListChannelsResponse -> ListChannelsResponse -> Bool #

max :: ListChannelsResponse -> ListChannelsResponse -> ListChannelsResponse #

min :: ListChannelsResponse -> ListChannelsResponse -> ListChannelsResponse #

Ord ListPeersRequest 
Instance details

Defined in Proto.Lightning

Methods

compare :: ListPeersRequest -> ListPeersRequest -> Ordering #

(<) :: ListPeersRequest -> ListPeersRequest -> Bool #

(<=) :: ListPeersRequest -> ListPeersRequest -> Bool #

(>) :: ListPeersRequest -> ListPeersRequest -> Bool #

(>=) :: ListPeersRequest -> ListPeersRequest -> Bool #

max :: ListPeersRequest -> ListPeersRequest -> ListPeersRequest #

min :: ListPeersRequest -> ListPeersRequest -> ListPeersRequest #

Ord ListPeersResponse 
Instance details

Defined in Proto.Lightning

Methods

compare :: ListPeersResponse -> ListPeersResponse -> Ordering #

(<) :: ListPeersResponse -> ListPeersResponse -> Bool #

(<=) :: ListPeersResponse -> ListPeersResponse -> Bool #

(>) :: ListPeersResponse -> ListPeersResponse -> Bool #

(>=) :: ListPeersResponse -> ListPeersResponse -> Bool #

max :: ListPeersResponse -> ListPeersResponse -> ListPeersResponse #

min :: ListPeersResponse -> ListPeersResponse -> ListPeersResponse #

Ord ListUnspentRequest 
Instance details

Defined in Proto.Lightning

Methods

compare :: ListUnspentRequest -> ListUnspentRequest -> Ordering #

(<) :: ListUnspentRequest -> ListUnspentRequest -> Bool #

(<=) :: ListUnspentRequest -> ListUnspentRequest -> Bool #

(>) :: ListUnspentRequest -> ListUnspentRequest -> Bool #

(>=) :: ListUnspentRequest -> ListUnspentRequest -> Bool #

max :: ListUnspentRequest -> ListUnspentRequest -> ListUnspentRequest #

min :: ListUnspentRequest -> ListUnspentRequest -> ListUnspentRequest #

Ord ListUnspentResponse 
Instance details

Defined in Proto.Lightning

Methods

compare :: ListUnspentResponse -> ListUnspentResponse -> Ordering #

(<) :: ListUnspentResponse -> ListUnspentResponse -> Bool #

(<=) :: ListUnspentResponse -> ListUnspentResponse -> Bool #

(>) :: ListUnspentResponse -> ListUnspentResponse -> Bool #

(>=) :: ListUnspentResponse -> ListUnspentResponse -> Bool #

max :: ListUnspentResponse -> ListUnspentResponse -> ListUnspentResponse #

min :: ListUnspentResponse -> ListUnspentResponse -> ListUnspentResponse #

Ord NewAddressRequest 
Instance details

Defined in Proto.Lightning

Methods

compare :: NewAddressRequest -> NewAddressRequest -> Ordering #

(<) :: NewAddressRequest -> NewAddressRequest -> Bool #

(<=) :: NewAddressRequest -> NewAddressRequest -> Bool #

(>) :: NewAddressRequest -> NewAddressRequest -> Bool #

(>=) :: NewAddressRequest -> NewAddressRequest -> Bool #

max :: NewAddressRequest -> NewAddressRequest -> NewAddressRequest #

min :: NewAddressRequest -> NewAddressRequest -> NewAddressRequest #

Ord NewAddressResponse 
Instance details

Defined in Proto.Lightning

Methods

compare :: NewAddressResponse -> NewAddressResponse -> Ordering #

(<) :: NewAddressResponse -> NewAddressResponse -> Bool #

(<=) :: NewAddressResponse -> NewAddressResponse -> Bool #

(>) :: NewAddressResponse -> NewAddressResponse -> Bool #

(>=) :: NewAddressResponse -> NewAddressResponse -> Bool #

max :: NewAddressResponse -> NewAddressResponse -> NewAddressResponse #

min :: NewAddressResponse -> NewAddressResponse -> NewAddressResponse #

Ord OpenChannelRequest 
Instance details

Defined in Proto.Lightning

Methods

compare :: OpenChannelRequest -> OpenChannelRequest -> Ordering #

(<) :: OpenChannelRequest -> OpenChannelRequest -> Bool #

(<=) :: OpenChannelRequest -> OpenChannelRequest -> Bool #

(>) :: OpenChannelRequest -> OpenChannelRequest -> Bool #

(>=) :: OpenChannelRequest -> OpenChannelRequest -> Bool #

max :: OpenChannelRequest -> OpenChannelRequest -> OpenChannelRequest #

min :: OpenChannelRequest -> OpenChannelRequest -> OpenChannelRequest #

Ord OpenStatusUpdate 
Instance details

Defined in Proto.Lightning

Methods

compare :: OpenStatusUpdate -> OpenStatusUpdate -> Ordering #

(<) :: OpenStatusUpdate -> OpenStatusUpdate -> Bool #

(<=) :: OpenStatusUpdate -> OpenStatusUpdate -> Bool #

(>) :: OpenStatusUpdate -> OpenStatusUpdate -> Bool #

(>=) :: OpenStatusUpdate -> OpenStatusUpdate -> Bool #

max :: OpenStatusUpdate -> OpenStatusUpdate -> OpenStatusUpdate #

min :: OpenStatusUpdate -> OpenStatusUpdate -> OpenStatusUpdate #

Ord OpenStatusUpdate'Update 
Instance details

Defined in Proto.Lightning

Methods

compare :: OpenStatusUpdate'Update -> OpenStatusUpdate'Update -> Ordering #

(<) :: OpenStatusUpdate'Update -> OpenStatusUpdate'Update -> Bool #

(<=) :: OpenStatusUpdate'Update -> OpenStatusUpdate'Update -> Bool #

(>) :: OpenStatusUpdate'Update -> OpenStatusUpdate'Update -> Bool #

(>=) :: OpenStatusUpdate'Update -> OpenStatusUpdate'Update -> Bool #

max :: OpenStatusUpdate'Update -> OpenStatusUpdate'Update -> OpenStatusUpdate'Update #

min :: OpenStatusUpdate'Update -> OpenStatusUpdate'Update -> OpenStatusUpdate'Update #

Ord Peer 
Instance details

Defined in Proto.Lightning

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 Peer'FeaturesEntry 
Instance details

Defined in Proto.Lightning

Methods

compare :: Peer'FeaturesEntry -> Peer'FeaturesEntry -> Ordering #

(<) :: Peer'FeaturesEntry -> Peer'FeaturesEntry -> Bool #

(<=) :: Peer'FeaturesEntry -> Peer'FeaturesEntry -> Bool #

(>) :: Peer'FeaturesEntry -> Peer'FeaturesEntry -> Bool #

(>=) :: Peer'FeaturesEntry -> Peer'FeaturesEntry -> Bool #

max :: Peer'FeaturesEntry -> Peer'FeaturesEntry -> Peer'FeaturesEntry #

min :: Peer'FeaturesEntry -> Peer'FeaturesEntry -> Peer'FeaturesEntry #

Ord Peer'SyncType 
Instance details

Defined in Proto.Lightning

Methods

compare :: Peer'SyncType -> Peer'SyncType -> Ordering #

(<) :: Peer'SyncType -> Peer'SyncType -> Bool #

(<=) :: Peer'SyncType -> Peer'SyncType -> Bool #

(>) :: Peer'SyncType -> Peer'SyncType -> Bool #

(>=) :: Peer'SyncType -> Peer'SyncType -> Bool #

max :: Peer'SyncType -> Peer'SyncType -> Peer'SyncType #

min :: Peer'SyncType -> Peer'SyncType -> Peer'SyncType #

Ord Peer'SyncType'UnrecognizedValue 
Instance details

Defined in Proto.Lightning

Methods

compare :: Peer'SyncType'UnrecognizedValue -> Peer'SyncType'UnrecognizedValue -> Ordering #

(<) :: Peer'SyncType'UnrecognizedValue -> Peer'SyncType'UnrecognizedValue -> Bool #

(<=) :: Peer'SyncType'UnrecognizedValue -> Peer'SyncType'UnrecognizedValue -> Bool #

(>) :: Peer'SyncType'UnrecognizedValue -> Peer'SyncType'UnrecognizedValue -> Bool #

(>=) :: Peer'SyncType'UnrecognizedValue -> Peer'SyncType'UnrecognizedValue -> Bool #

max :: Peer'SyncType'UnrecognizedValue -> Peer'SyncType'UnrecognizedValue -> Peer'SyncType'UnrecognizedValue #

min :: Peer'SyncType'UnrecognizedValue -> Peer'SyncType'UnrecognizedValue -> Peer'SyncType'UnrecognizedValue #

Ord PeerEvent 
Instance details

Defined in Proto.Lightning

Methods

compare :: PeerEvent -> PeerEvent -> Ordering #

(<) :: PeerEvent -> PeerEvent -> Bool #

(<=) :: PeerEvent -> PeerEvent -> Bool #

(>) :: PeerEvent -> PeerEvent -> Bool #

(>=) :: PeerEvent -> PeerEvent -> Bool #

max :: PeerEvent -> PeerEvent -> PeerEvent #

min :: PeerEvent -> PeerEvent -> PeerEvent #

Ord PeerEvent'EventType 
Instance details

Defined in Proto.Lightning

Methods

compare :: PeerEvent'EventType -> PeerEvent'EventType -> Ordering #

(<) :: PeerEvent'EventType -> PeerEvent'EventType -> Bool #

(<=) :: PeerEvent'EventType -> PeerEvent'EventType -> Bool #

(>) :: PeerEvent'EventType -> PeerEvent'EventType -> Bool #

(>=) :: PeerEvent'EventType -> PeerEvent'EventType -> Bool #

max :: PeerEvent'EventType -> PeerEvent'EventType -> PeerEvent'EventType #

min :: PeerEvent'EventType -> PeerEvent'EventType -> PeerEvent'EventType #

Ord PeerEvent'EventType'UnrecognizedValue 
Instance details

Defined in Proto.Lightning

Methods

compare :: PeerEvent'EventType'UnrecognizedValue -> PeerEvent'EventType'UnrecognizedValue -> Ordering #

(<) :: PeerEvent'EventType'UnrecognizedValue -> PeerEvent'EventType'UnrecognizedValue -> Bool #

(<=) :: PeerEvent'EventType'UnrecognizedValue -> PeerEvent'EventType'UnrecognizedValue -> Bool #

(>) :: PeerEvent'EventType'UnrecognizedValue -> PeerEvent'EventType'UnrecognizedValue -> Bool #

(>=) :: PeerEvent'EventType'UnrecognizedValue -> PeerEvent'EventType'UnrecognizedValue -> Bool #

max :: PeerEvent'EventType'UnrecognizedValue -> PeerEvent'EventType'UnrecognizedValue -> PeerEvent'EventType'UnrecognizedValue #

min :: PeerEvent'EventType'UnrecognizedValue -> PeerEvent'EventType'UnrecognizedValue -> PeerEvent'EventType'UnrecognizedValue #

Ord PeerEventSubscription 
Instance details

Defined in Proto.Lightning

Methods

compare :: PeerEventSubscription -> PeerEventSubscription -> Ordering #

(<) :: PeerEventSubscription -> PeerEventSubscription -> Bool #

(<=) :: PeerEventSubscription -> PeerEventSubscription -> Bool #

(>) :: PeerEventSubscription -> PeerEventSubscription -> Bool #

(>=) :: PeerEventSubscription -> PeerEventSubscription -> Bool #

max :: PeerEventSubscription -> PeerEventSubscription -> PeerEventSubscription #

min :: PeerEventSubscription -> PeerEventSubscription -> PeerEventSubscription #

Ord ReadyForPsbtFunding 
Instance details

Defined in Proto.Lightning

Methods

compare :: ReadyForPsbtFunding -> ReadyForPsbtFunding -> Ordering #

(<) :: ReadyForPsbtFunding -> ReadyForPsbtFunding -> Bool #

(<=) :: ReadyForPsbtFunding -> ReadyForPsbtFunding -> Bool #

(>) :: ReadyForPsbtFunding -> ReadyForPsbtFunding -> Bool #

(>=) :: ReadyForPsbtFunding -> ReadyForPsbtFunding -> Bool #

max :: ReadyForPsbtFunding -> ReadyForPsbtFunding -> ReadyForPsbtFunding #

min :: ReadyForPsbtFunding -> ReadyForPsbtFunding -> ReadyForPsbtFunding #

Ord SendCoinsRequest 
Instance details

Defined in Proto.Lightning

Methods

compare :: SendCoinsRequest -> SendCoinsRequest -> Ordering #

(<) :: SendCoinsRequest -> SendCoinsRequest -> Bool #

(<=) :: SendCoinsRequest -> SendCoinsRequest -> Bool #

(>) :: SendCoinsRequest -> SendCoinsRequest -> Bool #

(>=) :: SendCoinsRequest -> SendCoinsRequest -> Bool #

max :: SendCoinsRequest -> SendCoinsRequest -> SendCoinsRequest #

min :: SendCoinsRequest -> SendCoinsRequest -> SendCoinsRequest #

Ord SendCoinsResponse 
Instance details

Defined in Proto.Lightning

Methods

compare :: SendCoinsResponse -> SendCoinsResponse -> Ordering #

(<) :: SendCoinsResponse -> SendCoinsResponse -> Bool #

(<=) :: SendCoinsResponse -> SendCoinsResponse -> Bool #

(>) :: SendCoinsResponse -> SendCoinsResponse -> Bool #

(>=) :: SendCoinsResponse -> SendCoinsResponse -> Bool #

max :: SendCoinsResponse -> SendCoinsResponse -> SendCoinsResponse #

min :: SendCoinsResponse -> SendCoinsResponse -> SendCoinsResponse #

Ord SendCustomMessageRequest 
Instance details

Defined in Proto.Lightning

Methods

compare :: SendCustomMessageRequest -> SendCustomMessageRequest -> Ordering #

(<) :: SendCustomMessageRequest -> SendCustomMessageRequest -> Bool #

(<=) :: SendCustomMessageRequest -> SendCustomMessageRequest -> Bool #

(>) :: SendCustomMessageRequest -> SendCustomMessageRequest -> Bool #

(>=) :: SendCustomMessageRequest -> SendCustomMessageRequest -> Bool #

max :: SendCustomMessageRequest -> SendCustomMessageRequest -> SendCustomMessageRequest #

min :: SendCustomMessageRequest -> SendCustomMessageRequest -> SendCustomMessageRequest #

Ord SendCustomMessageResponse 
Instance details

Defined in Proto.Lightning

Methods

compare :: SendCustomMessageResponse -> SendCustomMessageResponse -> Ordering #

(<) :: SendCustomMessageResponse -> SendCustomMessageResponse -> Bool #

(<=) :: SendCustomMessageResponse -> SendCustomMessageResponse -> Bool #

(>) :: SendCustomMessageResponse -> SendCustomMessageResponse -> Bool #

(>=) :: SendCustomMessageResponse -> SendCustomMessageResponse -> Bool #

max :: SendCustomMessageResponse -> SendCustomMessageResponse -> SendCustomMessageResponse #

min :: SendCustomMessageResponse -> SendCustomMessageResponse -> SendCustomMessageResponse #

Ord SendManyRequest 
Instance details

Defined in Proto.Lightning

Methods

compare :: SendManyRequest -> SendManyRequest -> Ordering #

(<) :: SendManyRequest -> SendManyRequest -> Bool #

(<=) :: SendManyRequest -> SendManyRequest -> Bool #

(>) :: SendManyRequest -> SendManyRequest -> Bool #

(>=) :: SendManyRequest -> SendManyRequest -> Bool #

max :: SendManyRequest -> SendManyRequest -> SendManyRequest #

min :: SendManyRequest -> SendManyRequest -> SendManyRequest #

Ord SendManyRequest'AddrToAmountEntry 
Instance details

Defined in Proto.Lightning

Methods

compare :: SendManyRequest'AddrToAmountEntry -> SendManyRequest'AddrToAmountEntry -> Ordering #

(<) :: SendManyRequest'AddrToAmountEntry -> SendManyRequest'AddrToAmountEntry -> Bool #

(<=) :: SendManyRequest'AddrToAmountEntry -> SendManyRequest'AddrToAmountEntry -> Bool #

(>) :: SendManyRequest'AddrToAmountEntry -> SendManyRequest'AddrToAmountEntry -> Bool #

(>=) :: SendManyRequest'AddrToAmountEntry -> SendManyRequest'AddrToAmountEntry -> Bool #

max :: SendManyRequest'AddrToAmountEntry -> SendManyRequest'AddrToAmountEntry -> SendManyRequest'AddrToAmountEntry #

min :: SendManyRequest'AddrToAmountEntry -> SendManyRequest'AddrToAmountEntry -> SendManyRequest'AddrToAmountEntry #

Ord SendManyResponse 
Instance details

Defined in Proto.Lightning

Methods

compare :: SendManyResponse -> SendManyResponse -> Ordering #

(<) :: SendManyResponse -> SendManyResponse -> Bool #

(<=) :: SendManyResponse -> SendManyResponse -> Bool #

(>) :: SendManyResponse -> SendManyResponse -> Bool #

(>=) :: SendManyResponse -> SendManyResponse -> Bool #

max :: SendManyResponse -> SendManyResponse -> SendManyResponse #

min :: SendManyResponse -> SendManyResponse -> SendManyResponse #

Ord SendRequest 
Instance details

Defined in Proto.Lightning

Methods

compare :: SendRequest -> SendRequest -> Ordering #

(<) :: SendRequest -> SendRequest -> Bool #

(<=) :: SendRequest -> SendRequest -> Bool #

(>) :: SendRequest -> SendRequest -> Bool #

(>=) :: SendRequest -> SendRequest -> Bool #

max :: SendRequest -> SendRequest -> SendRequest #

min :: SendRequest -> SendRequest -> SendRequest #

Ord SendRequest'DestCustomRecordsEntry 
Instance details

Defined in Proto.Lightning

Methods

compare :: SendRequest'DestCustomRecordsEntry -> SendRequest'DestCustomRecordsEntry -> Ordering #

(<) :: SendRequest'DestCustomRecordsEntry -> SendRequest'DestCustomRecordsEntry -> Bool #

(<=) :: SendRequest'DestCustomRecordsEntry -> SendRequest'DestCustomRecordsEntry -> Bool #

(>) :: SendRequest'DestCustomRecordsEntry -> SendRequest'DestCustomRecordsEntry -> Bool #

(>=) :: SendRequest'DestCustomRecordsEntry -> SendRequest'DestCustomRecordsEntry -> Bool #

max :: SendRequest'DestCustomRecordsEntry -> SendRequest'DestCustomRecordsEntry -> SendRequest'DestCustomRecordsEntry #

min :: SendRequest'DestCustomRecordsEntry -> SendRequest'DestCustomRecordsEntry -> SendRequest'DestCustomRecordsEntry #

Ord SendResponse 
Instance details

Defined in Proto.Lightning

Methods

compare :: SendResponse -> SendResponse -> Ordering #

(<) :: SendResponse -> SendResponse -> Bool #

(<=) :: SendResponse -> SendResponse -> Bool #

(>) :: SendResponse -> SendResponse -> Bool #

(>=) :: SendResponse -> SendResponse -> Bool #

max :: SendResponse -> SendResponse -> SendResponse #

min :: SendResponse -> SendResponse -> SendResponse #

Ord SendToRouteRequest 
Instance details

Defined in Proto.Lightning

Methods

compare :: SendToRouteRequest -> SendToRouteRequest -> Ordering #

(<) :: SendToRouteRequest -> SendToRouteRequest -> Bool #

(<=) :: SendToRouteRequest -> SendToRouteRequest -> Bool #

(>) :: SendToRouteRequest -> SendToRouteRequest -> Bool #

(>=) :: SendToRouteRequest -> SendToRouteRequest -> Bool #

max :: SendToRouteRequest -> SendToRouteRequest -> SendToRouteRequest #

min :: SendToRouteRequest -> SendToRouteRequest -> SendToRouteRequest #

Ord SignMessageRequest 
Instance details

Defined in Proto.Lightning

Methods

compare :: SignMessageRequest -> SignMessageRequest -> Ordering #

(<) :: SignMessageRequest -> SignMessageRequest -> Bool #

(<=) :: SignMessageRequest -> SignMessageRequest -> Bool #

(>) :: SignMessageRequest -> SignMessageRequest -> Bool #

(>=) :: SignMessageRequest -> SignMessageRequest -> Bool #

max :: SignMessageRequest -> SignMessageRequest -> SignMessageRequest #

min :: SignMessageRequest -> SignMessageRequest -> SignMessageRequest #

Ord SignMessageResponse 
Instance details

Defined in Proto.Lightning

Methods

compare :: SignMessageResponse -> SignMessageResponse -> Ordering #

(<) :: SignMessageResponse -> SignMessageResponse -> Bool #

(<=) :: SignMessageResponse -> SignMessageResponse -> Bool #

(>) :: SignMessageResponse -> SignMessageResponse -> Bool #

(>=) :: SignMessageResponse -> SignMessageResponse -> Bool #

max :: SignMessageResponse -> SignMessageResponse -> SignMessageResponse #

min :: SignMessageResponse -> SignMessageResponse -> SignMessageResponse #

Ord SubscribeCustomMessagesRequest 
Instance details

Defined in Proto.Lightning

Methods

compare :: SubscribeCustomMessagesRequest -> SubscribeCustomMessagesRequest -> Ordering #

(<) :: SubscribeCustomMessagesRequest -> SubscribeCustomMessagesRequest -> Bool #

(<=) :: SubscribeCustomMessagesRequest -> SubscribeCustomMessagesRequest -> Bool #

(>) :: SubscribeCustomMessagesRequest -> SubscribeCustomMessagesRequest -> Bool #

(>=) :: SubscribeCustomMessagesRequest -> SubscribeCustomMessagesRequest -> Bool #

max :: SubscribeCustomMessagesRequest -> SubscribeCustomMessagesRequest -> SubscribeCustomMessagesRequest #

min :: SubscribeCustomMessagesRequest -> SubscribeCustomMessagesRequest -> SubscribeCustomMessagesRequest #

Ord TimestampedError 
Instance details

Defined in Proto.Lightning

Methods

compare :: TimestampedError -> TimestampedError -> Ordering #

(<) :: TimestampedError -> TimestampedError -> Bool #

(<=) :: TimestampedError -> TimestampedError -> Bool #

(>) :: TimestampedError -> TimestampedError -> Bool #

(>=) :: TimestampedError -> TimestampedError -> Bool #

max :: TimestampedError -> TimestampedError -> TimestampedError #

min :: TimestampedError -> TimestampedError -> TimestampedError #

Ord Transaction 
Instance details

Defined in Proto.Lightning

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 TransactionDetails 
Instance details

Defined in Proto.Lightning

Methods

compare :: TransactionDetails -> TransactionDetails -> Ordering #

(<) :: TransactionDetails -> TransactionDetails -> Bool #

(<=) :: TransactionDetails -> TransactionDetails -> Bool #

(>) :: TransactionDetails -> TransactionDetails -> Bool #

(>=) :: TransactionDetails -> TransactionDetails -> Bool #

max :: TransactionDetails -> TransactionDetails -> TransactionDetails #

min :: TransactionDetails -> TransactionDetails -> TransactionDetails #

Ord Utxo 
Instance details

Defined in Proto.Lightning

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 VerifyMessageRequest 
Instance details

Defined in Proto.Lightning

Methods

compare :: VerifyMessageRequest -> VerifyMessageRequest -> Ordering #

(<) :: VerifyMessageRequest -> VerifyMessageRequest -> Bool #

(<=) :: VerifyMessageRequest -> VerifyMessageRequest -> Bool #

(>) :: VerifyMessageRequest -> VerifyMessageRequest -> Bool #

(>=) :: VerifyMessageRequest -> VerifyMessageRequest -> Bool #

max :: VerifyMessageRequest -> VerifyMessageRequest -> VerifyMessageRequest #

min :: VerifyMessageRequest -> VerifyMessageRequest -> VerifyMessageRequest #

Ord VerifyMessageResponse 
Instance details

Defined in Proto.Lightning

Methods

compare :: VerifyMessageResponse -> VerifyMessageResponse -> Ordering #

(<) :: VerifyMessageResponse -> VerifyMessageResponse -> Bool #

(<=) :: VerifyMessageResponse -> VerifyMessageResponse -> Bool #

(>) :: VerifyMessageResponse -> VerifyMessageResponse -> Bool #

(>=) :: VerifyMessageResponse -> VerifyMessageResponse -> Bool #

max :: VerifyMessageResponse -> VerifyMessageResponse -> VerifyMessageResponse #

min :: VerifyMessageResponse -> VerifyMessageResponse -> VerifyMessageResponse #

Ord AMPRecord 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: AMPRecord -> AMPRecord -> Ordering #

(<) :: AMPRecord -> AMPRecord -> Bool #

(<=) :: AMPRecord -> AMPRecord -> Bool #

(>) :: AMPRecord -> AMPRecord -> Bool #

(>=) :: AMPRecord -> AMPRecord -> Bool #

max :: AMPRecord -> AMPRecord -> AMPRecord #

min :: AMPRecord -> AMPRecord -> AMPRecord #

Ord Amount 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: Amount -> Amount -> Ordering #

(<) :: Amount -> Amount -> Bool #

(<=) :: Amount -> Amount -> Bool #

(>) :: Amount -> Amount -> Bool #

(>=) :: Amount -> Amount -> Bool #

max :: Amount -> Amount -> Amount #

min :: Amount -> Amount -> Amount #

Ord ChanInfoRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: ChanInfoRequest -> ChanInfoRequest -> Ordering #

(<) :: ChanInfoRequest -> ChanInfoRequest -> Bool #

(<=) :: ChanInfoRequest -> ChanInfoRequest -> Bool #

(>) :: ChanInfoRequest -> ChanInfoRequest -> Bool #

(>=) :: ChanInfoRequest -> ChanInfoRequest -> Bool #

max :: ChanInfoRequest -> ChanInfoRequest -> ChanInfoRequest #

min :: ChanInfoRequest -> ChanInfoRequest -> ChanInfoRequest #

Ord ChanPointShim 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: ChanPointShim -> ChanPointShim -> Ordering #

(<) :: ChanPointShim -> ChanPointShim -> Bool #

(<=) :: ChanPointShim -> ChanPointShim -> Bool #

(>) :: ChanPointShim -> ChanPointShim -> Bool #

(>=) :: ChanPointShim -> ChanPointShim -> Bool #

max :: ChanPointShim -> ChanPointShim -> ChanPointShim #

min :: ChanPointShim -> ChanPointShim -> ChanPointShim #

Ord Channel 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: Channel -> Channel -> Ordering #

(<) :: Channel -> Channel -> Bool #

(<=) :: Channel -> Channel -> Bool #

(>) :: Channel -> Channel -> Bool #

(>=) :: Channel -> Channel -> Bool #

max :: Channel -> Channel -> Channel #

min :: Channel -> Channel -> Channel #

Ord ChannelBalanceRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: ChannelBalanceRequest -> ChannelBalanceRequest -> Ordering #

(<) :: ChannelBalanceRequest -> ChannelBalanceRequest -> Bool #

(<=) :: ChannelBalanceRequest -> ChannelBalanceRequest -> Bool #

(>) :: ChannelBalanceRequest -> ChannelBalanceRequest -> Bool #

(>=) :: ChannelBalanceRequest -> ChannelBalanceRequest -> Bool #

max :: ChannelBalanceRequest -> ChannelBalanceRequest -> ChannelBalanceRequest #

min :: ChannelBalanceRequest -> ChannelBalanceRequest -> ChannelBalanceRequest #

Ord ChannelBalanceResponse 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: ChannelBalanceResponse -> ChannelBalanceResponse -> Ordering #

(<) :: ChannelBalanceResponse -> ChannelBalanceResponse -> Bool #

(<=) :: ChannelBalanceResponse -> ChannelBalanceResponse -> Bool #

(>) :: ChannelBalanceResponse -> ChannelBalanceResponse -> Bool #

(>=) :: ChannelBalanceResponse -> ChannelBalanceResponse -> Bool #

max :: ChannelBalanceResponse -> ChannelBalanceResponse -> ChannelBalanceResponse #

min :: ChannelBalanceResponse -> ChannelBalanceResponse -> ChannelBalanceResponse #

Ord ChannelCloseSummary 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: ChannelCloseSummary -> ChannelCloseSummary -> Ordering #

(<) :: ChannelCloseSummary -> ChannelCloseSummary -> Bool #

(<=) :: ChannelCloseSummary -> ChannelCloseSummary -> Bool #

(>) :: ChannelCloseSummary -> ChannelCloseSummary -> Bool #

(>=) :: ChannelCloseSummary -> ChannelCloseSummary -> Bool #

max :: ChannelCloseSummary -> ChannelCloseSummary -> ChannelCloseSummary #

min :: ChannelCloseSummary -> ChannelCloseSummary -> ChannelCloseSummary #

Ord ChannelCloseSummary'ClosureType 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: ChannelCloseSummary'ClosureType -> ChannelCloseSummary'ClosureType -> Ordering #

(<) :: ChannelCloseSummary'ClosureType -> ChannelCloseSummary'ClosureType -> Bool #

(<=) :: ChannelCloseSummary'ClosureType -> ChannelCloseSummary'ClosureType -> Bool #

(>) :: ChannelCloseSummary'ClosureType -> ChannelCloseSummary'ClosureType -> Bool #

(>=) :: ChannelCloseSummary'ClosureType -> ChannelCloseSummary'ClosureType -> Bool #

max :: ChannelCloseSummary'ClosureType -> ChannelCloseSummary'ClosureType -> ChannelCloseSummary'ClosureType #

min :: ChannelCloseSummary'ClosureType -> ChannelCloseSummary'ClosureType -> ChannelCloseSummary'ClosureType #

Ord ChannelCloseSummary'ClosureType'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: ChannelCloseSummary'ClosureType'UnrecognizedValue -> ChannelCloseSummary'ClosureType'UnrecognizedValue -> Ordering #

(<) :: ChannelCloseSummary'ClosureType'UnrecognizedValue -> ChannelCloseSummary'ClosureType'UnrecognizedValue -> Bool #

(<=) :: ChannelCloseSummary'ClosureType'UnrecognizedValue -> ChannelCloseSummary'ClosureType'UnrecognizedValue -> Bool #

(>) :: ChannelCloseSummary'ClosureType'UnrecognizedValue -> ChannelCloseSummary'ClosureType'UnrecognizedValue -> Bool #

(>=) :: ChannelCloseSummary'ClosureType'UnrecognizedValue -> ChannelCloseSummary'ClosureType'UnrecognizedValue -> Bool #

max :: ChannelCloseSummary'ClosureType'UnrecognizedValue -> ChannelCloseSummary'ClosureType'UnrecognizedValue -> ChannelCloseSummary'ClosureType'UnrecognizedValue #

min :: ChannelCloseSummary'ClosureType'UnrecognizedValue -> ChannelCloseSummary'ClosureType'UnrecognizedValue -> ChannelCloseSummary'ClosureType'UnrecognizedValue #

Ord ChannelConstraints 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: ChannelConstraints -> ChannelConstraints -> Ordering #

(<) :: ChannelConstraints -> ChannelConstraints -> Bool #

(<=) :: ChannelConstraints -> ChannelConstraints -> Bool #

(>) :: ChannelConstraints -> ChannelConstraints -> Bool #

(>=) :: ChannelConstraints -> ChannelConstraints -> Bool #

max :: ChannelConstraints -> ChannelConstraints -> ChannelConstraints #

min :: ChannelConstraints -> ChannelConstraints -> ChannelConstraints #

Ord ChannelEdge 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: ChannelEdge -> ChannelEdge -> Ordering #

(<) :: ChannelEdge -> ChannelEdge -> Bool #

(<=) :: ChannelEdge -> ChannelEdge -> Bool #

(>) :: ChannelEdge -> ChannelEdge -> Bool #

(>=) :: ChannelEdge -> ChannelEdge -> Bool #

max :: ChannelEdge -> ChannelEdge -> ChannelEdge #

min :: ChannelEdge -> ChannelEdge -> ChannelEdge #

Ord ChannelEdgeUpdate 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: ChannelEdgeUpdate -> ChannelEdgeUpdate -> Ordering #

(<) :: ChannelEdgeUpdate -> ChannelEdgeUpdate -> Bool #

(<=) :: ChannelEdgeUpdate -> ChannelEdgeUpdate -> Bool #

(>) :: ChannelEdgeUpdate -> ChannelEdgeUpdate -> Bool #

(>=) :: ChannelEdgeUpdate -> ChannelEdgeUpdate -> Bool #

max :: ChannelEdgeUpdate -> ChannelEdgeUpdate -> ChannelEdgeUpdate #

min :: ChannelEdgeUpdate -> ChannelEdgeUpdate -> ChannelEdgeUpdate #

Ord ChannelEventSubscription 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: ChannelEventSubscription -> ChannelEventSubscription -> Ordering #

(<) :: ChannelEventSubscription -> ChannelEventSubscription -> Bool #

(<=) :: ChannelEventSubscription -> ChannelEventSubscription -> Bool #

(>) :: ChannelEventSubscription -> ChannelEventSubscription -> Bool #

(>=) :: ChannelEventSubscription -> ChannelEventSubscription -> Bool #

max :: ChannelEventSubscription -> ChannelEventSubscription -> ChannelEventSubscription #

min :: ChannelEventSubscription -> ChannelEventSubscription -> ChannelEventSubscription #

Ord ChannelEventUpdate 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: ChannelEventUpdate -> ChannelEventUpdate -> Ordering #

(<) :: ChannelEventUpdate -> ChannelEventUpdate -> Bool #

(<=) :: ChannelEventUpdate -> ChannelEventUpdate -> Bool #

(>) :: ChannelEventUpdate -> ChannelEventUpdate -> Bool #

(>=) :: ChannelEventUpdate -> ChannelEventUpdate -> Bool #

max :: ChannelEventUpdate -> ChannelEventUpdate -> ChannelEventUpdate #

min :: ChannelEventUpdate -> ChannelEventUpdate -> ChannelEventUpdate #

Ord ChannelEventUpdate'Channel 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: ChannelEventUpdate'Channel -> ChannelEventUpdate'Channel -> Ordering #

(<) :: ChannelEventUpdate'Channel -> ChannelEventUpdate'Channel -> Bool #

(<=) :: ChannelEventUpdate'Channel -> ChannelEventUpdate'Channel -> Bool #

(>) :: ChannelEventUpdate'Channel -> ChannelEventUpdate'Channel -> Bool #

(>=) :: ChannelEventUpdate'Channel -> ChannelEventUpdate'Channel -> Bool #

max :: ChannelEventUpdate'Channel -> ChannelEventUpdate'Channel -> ChannelEventUpdate'Channel #

min :: ChannelEventUpdate'Channel -> ChannelEventUpdate'Channel -> ChannelEventUpdate'Channel #

Ord ChannelEventUpdate'UpdateType 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: ChannelEventUpdate'UpdateType -> ChannelEventUpdate'UpdateType -> Ordering #

(<) :: ChannelEventUpdate'UpdateType -> ChannelEventUpdate'UpdateType -> Bool #

(<=) :: ChannelEventUpdate'UpdateType -> ChannelEventUpdate'UpdateType -> Bool #

(>) :: ChannelEventUpdate'UpdateType -> ChannelEventUpdate'UpdateType -> Bool #

(>=) :: ChannelEventUpdate'UpdateType -> ChannelEventUpdate'UpdateType -> Bool #

max :: ChannelEventUpdate'UpdateType -> ChannelEventUpdate'UpdateType -> ChannelEventUpdate'UpdateType #

min :: ChannelEventUpdate'UpdateType -> ChannelEventUpdate'UpdateType -> ChannelEventUpdate'UpdateType #

Ord ChannelEventUpdate'UpdateType'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: ChannelEventUpdate'UpdateType'UnrecognizedValue -> ChannelEventUpdate'UpdateType'UnrecognizedValue -> Ordering #

(<) :: ChannelEventUpdate'UpdateType'UnrecognizedValue -> ChannelEventUpdate'UpdateType'UnrecognizedValue -> Bool #

(<=) :: ChannelEventUpdate'UpdateType'UnrecognizedValue -> ChannelEventUpdate'UpdateType'UnrecognizedValue -> Bool #

(>) :: ChannelEventUpdate'UpdateType'UnrecognizedValue -> ChannelEventUpdate'UpdateType'UnrecognizedValue -> Bool #

(>=) :: ChannelEventUpdate'UpdateType'UnrecognizedValue -> ChannelEventUpdate'UpdateType'UnrecognizedValue -> Bool #

max :: ChannelEventUpdate'UpdateType'UnrecognizedValue -> ChannelEventUpdate'UpdateType'UnrecognizedValue -> ChannelEventUpdate'UpdateType'UnrecognizedValue #

min :: ChannelEventUpdate'UpdateType'UnrecognizedValue -> ChannelEventUpdate'UpdateType'UnrecognizedValue -> ChannelEventUpdate'UpdateType'UnrecognizedValue #

Ord ChannelGraph 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: ChannelGraph -> ChannelGraph -> Ordering #

(<) :: ChannelGraph -> ChannelGraph -> Bool #

(<=) :: ChannelGraph -> ChannelGraph -> Bool #

(>) :: ChannelGraph -> ChannelGraph -> Bool #

(>=) :: ChannelGraph -> ChannelGraph -> Bool #

max :: ChannelGraph -> ChannelGraph -> ChannelGraph #

min :: ChannelGraph -> ChannelGraph -> ChannelGraph #

Ord ChannelGraphRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: ChannelGraphRequest -> ChannelGraphRequest -> Ordering #

(<) :: ChannelGraphRequest -> ChannelGraphRequest -> Bool #

(<=) :: ChannelGraphRequest -> ChannelGraphRequest -> Bool #

(>) :: ChannelGraphRequest -> ChannelGraphRequest -> Bool #

(>=) :: ChannelGraphRequest -> ChannelGraphRequest -> Bool #

max :: ChannelGraphRequest -> ChannelGraphRequest -> ChannelGraphRequest #

min :: ChannelGraphRequest -> ChannelGraphRequest -> ChannelGraphRequest #

Ord ChannelPoint 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: ChannelPoint -> ChannelPoint -> Ordering #

(<) :: ChannelPoint -> ChannelPoint -> Bool #

(<=) :: ChannelPoint -> ChannelPoint -> Bool #

(>) :: ChannelPoint -> ChannelPoint -> Bool #

(>=) :: ChannelPoint -> ChannelPoint -> Bool #

max :: ChannelPoint -> ChannelPoint -> ChannelPoint #

min :: ChannelPoint -> ChannelPoint -> ChannelPoint #

Ord ChannelPoint'FundingTxid 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: ChannelPoint'FundingTxid -> ChannelPoint'FundingTxid -> Ordering #

(<) :: ChannelPoint'FundingTxid -> ChannelPoint'FundingTxid -> Bool #

(<=) :: ChannelPoint'FundingTxid -> ChannelPoint'FundingTxid -> Bool #

(>) :: ChannelPoint'FundingTxid -> ChannelPoint'FundingTxid -> Bool #

(>=) :: ChannelPoint'FundingTxid -> ChannelPoint'FundingTxid -> Bool #

max :: ChannelPoint'FundingTxid -> ChannelPoint'FundingTxid -> ChannelPoint'FundingTxid #

min :: ChannelPoint'FundingTxid -> ChannelPoint'FundingTxid -> ChannelPoint'FundingTxid #

Ord ClosedChannelUpdate 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: ClosedChannelUpdate -> ClosedChannelUpdate -> Ordering #

(<) :: ClosedChannelUpdate -> ClosedChannelUpdate -> Bool #

(<=) :: ClosedChannelUpdate -> ClosedChannelUpdate -> Bool #

(>) :: ClosedChannelUpdate -> ClosedChannelUpdate -> Bool #

(>=) :: ClosedChannelUpdate -> ClosedChannelUpdate -> Bool #

max :: ClosedChannelUpdate -> ClosedChannelUpdate -> ClosedChannelUpdate #

min :: ClosedChannelUpdate -> ClosedChannelUpdate -> ClosedChannelUpdate #

Ord CommitmentType 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: CommitmentType -> CommitmentType -> Ordering #

(<) :: CommitmentType -> CommitmentType -> Bool #

(<=) :: CommitmentType -> CommitmentType -> Bool #

(>) :: CommitmentType -> CommitmentType -> Bool #

(>=) :: CommitmentType -> CommitmentType -> Bool #

max :: CommitmentType -> CommitmentType -> CommitmentType #

min :: CommitmentType -> CommitmentType -> CommitmentType #

Ord CommitmentType'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: CommitmentType'UnrecognizedValue -> CommitmentType'UnrecognizedValue -> Ordering #

(<) :: CommitmentType'UnrecognizedValue -> CommitmentType'UnrecognizedValue -> Bool #

(<=) :: CommitmentType'UnrecognizedValue -> CommitmentType'UnrecognizedValue -> Bool #

(>) :: CommitmentType'UnrecognizedValue -> CommitmentType'UnrecognizedValue -> Bool #

(>=) :: CommitmentType'UnrecognizedValue -> CommitmentType'UnrecognizedValue -> Bool #

max :: CommitmentType'UnrecognizedValue -> CommitmentType'UnrecognizedValue -> CommitmentType'UnrecognizedValue #

min :: CommitmentType'UnrecognizedValue -> CommitmentType'UnrecognizedValue -> CommitmentType'UnrecognizedValue #

Ord EdgeLocator 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: EdgeLocator -> EdgeLocator -> Ordering #

(<) :: EdgeLocator -> EdgeLocator -> Bool #

(<=) :: EdgeLocator -> EdgeLocator -> Bool #

(>) :: EdgeLocator -> EdgeLocator -> Bool #

(>=) :: EdgeLocator -> EdgeLocator -> Bool #

max :: EdgeLocator -> EdgeLocator -> EdgeLocator #

min :: EdgeLocator -> EdgeLocator -> EdgeLocator #

Ord Feature 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: Feature -> Feature -> Ordering #

(<) :: Feature -> Feature -> Bool #

(<=) :: Feature -> Feature -> Bool #

(>) :: Feature -> Feature -> Bool #

(>=) :: Feature -> Feature -> Bool #

max :: Feature -> Feature -> Feature #

min :: Feature -> Feature -> Feature #

Ord FeatureBit 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: FeatureBit -> FeatureBit -> Ordering #

(<) :: FeatureBit -> FeatureBit -> Bool #

(<=) :: FeatureBit -> FeatureBit -> Bool #

(>) :: FeatureBit -> FeatureBit -> Bool #

(>=) :: FeatureBit -> FeatureBit -> Bool #

max :: FeatureBit -> FeatureBit -> FeatureBit #

min :: FeatureBit -> FeatureBit -> FeatureBit #

Ord FeatureBit'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: FeatureBit'UnrecognizedValue -> FeatureBit'UnrecognizedValue -> Ordering #

(<) :: FeatureBit'UnrecognizedValue -> FeatureBit'UnrecognizedValue -> Bool #

(<=) :: FeatureBit'UnrecognizedValue -> FeatureBit'UnrecognizedValue -> Bool #

(>) :: FeatureBit'UnrecognizedValue -> FeatureBit'UnrecognizedValue -> Bool #

(>=) :: FeatureBit'UnrecognizedValue -> FeatureBit'UnrecognizedValue -> Bool #

max :: FeatureBit'UnrecognizedValue -> FeatureBit'UnrecognizedValue -> FeatureBit'UnrecognizedValue #

min :: FeatureBit'UnrecognizedValue -> FeatureBit'UnrecognizedValue -> FeatureBit'UnrecognizedValue #

Ord FeeLimit 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: FeeLimit -> FeeLimit -> Ordering #

(<) :: FeeLimit -> FeeLimit -> Bool #

(<=) :: FeeLimit -> FeeLimit -> Bool #

(>) :: FeeLimit -> FeeLimit -> Bool #

(>=) :: FeeLimit -> FeeLimit -> Bool #

max :: FeeLimit -> FeeLimit -> FeeLimit #

min :: FeeLimit -> FeeLimit -> FeeLimit #

Ord FeeLimit'Limit 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: FeeLimit'Limit -> FeeLimit'Limit -> Ordering #

(<) :: FeeLimit'Limit -> FeeLimit'Limit -> Bool #

(<=) :: FeeLimit'Limit -> FeeLimit'Limit -> Bool #

(>) :: FeeLimit'Limit -> FeeLimit'Limit -> Bool #

(>=) :: FeeLimit'Limit -> FeeLimit'Limit -> Bool #

max :: FeeLimit'Limit -> FeeLimit'Limit -> FeeLimit'Limit #

min :: FeeLimit'Limit -> FeeLimit'Limit -> FeeLimit'Limit #

Ord FloatMetric 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: FloatMetric -> FloatMetric -> Ordering #

(<) :: FloatMetric -> FloatMetric -> Bool #

(<=) :: FloatMetric -> FloatMetric -> Bool #

(>) :: FloatMetric -> FloatMetric -> Bool #

(>=) :: FloatMetric -> FloatMetric -> Bool #

max :: FloatMetric -> FloatMetric -> FloatMetric #

min :: FloatMetric -> FloatMetric -> FloatMetric #

Ord FundingPsbtFinalize 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: FundingPsbtFinalize -> FundingPsbtFinalize -> Ordering #

(<) :: FundingPsbtFinalize -> FundingPsbtFinalize -> Bool #

(<=) :: FundingPsbtFinalize -> FundingPsbtFinalize -> Bool #

(>) :: FundingPsbtFinalize -> FundingPsbtFinalize -> Bool #

(>=) :: FundingPsbtFinalize -> FundingPsbtFinalize -> Bool #

max :: FundingPsbtFinalize -> FundingPsbtFinalize -> FundingPsbtFinalize #

min :: FundingPsbtFinalize -> FundingPsbtFinalize -> FundingPsbtFinalize #

Ord FundingPsbtVerify 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: FundingPsbtVerify -> FundingPsbtVerify -> Ordering #

(<) :: FundingPsbtVerify -> FundingPsbtVerify -> Bool #

(<=) :: FundingPsbtVerify -> FundingPsbtVerify -> Bool #

(>) :: FundingPsbtVerify -> FundingPsbtVerify -> Bool #

(>=) :: FundingPsbtVerify -> FundingPsbtVerify -> Bool #

max :: FundingPsbtVerify -> FundingPsbtVerify -> FundingPsbtVerify #

min :: FundingPsbtVerify -> FundingPsbtVerify -> FundingPsbtVerify #

Ord FundingShim 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: FundingShim -> FundingShim -> Ordering #

(<) :: FundingShim -> FundingShim -> Bool #

(<=) :: FundingShim -> FundingShim -> Bool #

(>) :: FundingShim -> FundingShim -> Bool #

(>=) :: FundingShim -> FundingShim -> Bool #

max :: FundingShim -> FundingShim -> FundingShim #

min :: FundingShim -> FundingShim -> FundingShim #

Ord FundingShim'Shim 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: FundingShim'Shim -> FundingShim'Shim -> Ordering #

(<) :: FundingShim'Shim -> FundingShim'Shim -> Bool #

(<=) :: FundingShim'Shim -> FundingShim'Shim -> Bool #

(>) :: FundingShim'Shim -> FundingShim'Shim -> Bool #

(>=) :: FundingShim'Shim -> FundingShim'Shim -> Bool #

max :: FundingShim'Shim -> FundingShim'Shim -> FundingShim'Shim #

min :: FundingShim'Shim -> FundingShim'Shim -> FundingShim'Shim #

Ord FundingShimCancel 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: FundingShimCancel -> FundingShimCancel -> Ordering #

(<) :: FundingShimCancel -> FundingShimCancel -> Bool #

(<=) :: FundingShimCancel -> FundingShimCancel -> Bool #

(>) :: FundingShimCancel -> FundingShimCancel -> Bool #

(>=) :: FundingShimCancel -> FundingShimCancel -> Bool #

max :: FundingShimCancel -> FundingShimCancel -> FundingShimCancel #

min :: FundingShimCancel -> FundingShimCancel -> FundingShimCancel #

Ord FundingStateStepResp 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: FundingStateStepResp -> FundingStateStepResp -> Ordering #

(<) :: FundingStateStepResp -> FundingStateStepResp -> Bool #

(<=) :: FundingStateStepResp -> FundingStateStepResp -> Bool #

(>) :: FundingStateStepResp -> FundingStateStepResp -> Bool #

(>=) :: FundingStateStepResp -> FundingStateStepResp -> Bool #

max :: FundingStateStepResp -> FundingStateStepResp -> FundingStateStepResp #

min :: FundingStateStepResp -> FundingStateStepResp -> FundingStateStepResp #

Ord FundingTransitionMsg 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: FundingTransitionMsg -> FundingTransitionMsg -> Ordering #

(<) :: FundingTransitionMsg -> FundingTransitionMsg -> Bool #

(<=) :: FundingTransitionMsg -> FundingTransitionMsg -> Bool #

(>) :: FundingTransitionMsg -> FundingTransitionMsg -> Bool #

(>=) :: FundingTransitionMsg -> FundingTransitionMsg -> Bool #

max :: FundingTransitionMsg -> FundingTransitionMsg -> FundingTransitionMsg #

min :: FundingTransitionMsg -> FundingTransitionMsg -> FundingTransitionMsg #

Ord FundingTransitionMsg'Trigger 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: FundingTransitionMsg'Trigger -> FundingTransitionMsg'Trigger -> Ordering #

(<) :: FundingTransitionMsg'Trigger -> FundingTransitionMsg'Trigger -> Bool #

(<=) :: FundingTransitionMsg'Trigger -> FundingTransitionMsg'Trigger -> Bool #

(>) :: FundingTransitionMsg'Trigger -> FundingTransitionMsg'Trigger -> Bool #

(>=) :: FundingTransitionMsg'Trigger -> FundingTransitionMsg'Trigger -> Bool #

max :: FundingTransitionMsg'Trigger -> FundingTransitionMsg'Trigger -> FundingTransitionMsg'Trigger #

min :: FundingTransitionMsg'Trigger -> FundingTransitionMsg'Trigger -> FundingTransitionMsg'Trigger #

Ord GraphTopologySubscription 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: GraphTopologySubscription -> GraphTopologySubscription -> Ordering #

(<) :: GraphTopologySubscription -> GraphTopologySubscription -> Bool #

(<=) :: GraphTopologySubscription -> GraphTopologySubscription -> Bool #

(>) :: GraphTopologySubscription -> GraphTopologySubscription -> Bool #

(>=) :: GraphTopologySubscription -> GraphTopologySubscription -> Bool #

max :: GraphTopologySubscription -> GraphTopologySubscription -> GraphTopologySubscription #

min :: GraphTopologySubscription -> GraphTopologySubscription -> GraphTopologySubscription #

Ord GraphTopologyUpdate 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: GraphTopologyUpdate -> GraphTopologyUpdate -> Ordering #

(<) :: GraphTopologyUpdate -> GraphTopologyUpdate -> Bool #

(<=) :: GraphTopologyUpdate -> GraphTopologyUpdate -> Bool #

(>) :: GraphTopologyUpdate -> GraphTopologyUpdate -> Bool #

(>=) :: GraphTopologyUpdate -> GraphTopologyUpdate -> Bool #

max :: GraphTopologyUpdate -> GraphTopologyUpdate -> GraphTopologyUpdate #

min :: GraphTopologyUpdate -> GraphTopologyUpdate -> GraphTopologyUpdate #

Ord HTLC 
Instance details

Defined in Proto.Lnrpc.Ln0

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 Hop 
Instance details

Defined in Proto.Lnrpc.Ln0

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 Hop'CustomRecordsEntry 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: Hop'CustomRecordsEntry -> Hop'CustomRecordsEntry -> Ordering #

(<) :: Hop'CustomRecordsEntry -> Hop'CustomRecordsEntry -> Bool #

(<=) :: Hop'CustomRecordsEntry -> Hop'CustomRecordsEntry -> Bool #

(>) :: Hop'CustomRecordsEntry -> Hop'CustomRecordsEntry -> Bool #

(>=) :: Hop'CustomRecordsEntry -> Hop'CustomRecordsEntry -> Bool #

max :: Hop'CustomRecordsEntry -> Hop'CustomRecordsEntry -> Hop'CustomRecordsEntry #

min :: Hop'CustomRecordsEntry -> Hop'CustomRecordsEntry -> Hop'CustomRecordsEntry #

Ord HopHint 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: HopHint -> HopHint -> Ordering #

(<) :: HopHint -> HopHint -> Bool #

(<=) :: HopHint -> HopHint -> Bool #

(>) :: HopHint -> HopHint -> Bool #

(>=) :: HopHint -> HopHint -> Bool #

max :: HopHint -> HopHint -> HopHint #

min :: HopHint -> HopHint -> HopHint #

Ord Initiator 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: Initiator -> Initiator -> Ordering #

(<) :: Initiator -> Initiator -> Bool #

(<=) :: Initiator -> Initiator -> Bool #

(>) :: Initiator -> Initiator -> Bool #

(>=) :: Initiator -> Initiator -> Bool #

max :: Initiator -> Initiator -> Initiator #

min :: Initiator -> Initiator -> Initiator #

Ord Initiator'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: Initiator'UnrecognizedValue -> Initiator'UnrecognizedValue -> Ordering #

(<) :: Initiator'UnrecognizedValue -> Initiator'UnrecognizedValue -> Bool #

(<=) :: Initiator'UnrecognizedValue -> Initiator'UnrecognizedValue -> Bool #

(>) :: Initiator'UnrecognizedValue -> Initiator'UnrecognizedValue -> Bool #

(>=) :: Initiator'UnrecognizedValue -> Initiator'UnrecognizedValue -> Bool #

max :: Initiator'UnrecognizedValue -> Initiator'UnrecognizedValue -> Initiator'UnrecognizedValue #

min :: Initiator'UnrecognizedValue -> Initiator'UnrecognizedValue -> Initiator'UnrecognizedValue #

Ord KeyDescriptor 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: KeyDescriptor -> KeyDescriptor -> Ordering #

(<) :: KeyDescriptor -> KeyDescriptor -> Bool #

(<=) :: KeyDescriptor -> KeyDescriptor -> Bool #

(>) :: KeyDescriptor -> KeyDescriptor -> Bool #

(>=) :: KeyDescriptor -> KeyDescriptor -> Bool #

max :: KeyDescriptor -> KeyDescriptor -> KeyDescriptor #

min :: KeyDescriptor -> KeyDescriptor -> KeyDescriptor #

Ord KeyLocator 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: KeyLocator -> KeyLocator -> Ordering #

(<) :: KeyLocator -> KeyLocator -> Bool #

(<=) :: KeyLocator -> KeyLocator -> Bool #

(>) :: KeyLocator -> KeyLocator -> Bool #

(>=) :: KeyLocator -> KeyLocator -> Bool #

max :: KeyLocator -> KeyLocator -> KeyLocator #

min :: KeyLocator -> KeyLocator -> KeyLocator #

Ord LightningNode 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: LightningNode -> LightningNode -> Ordering #

(<) :: LightningNode -> LightningNode -> Bool #

(<=) :: LightningNode -> LightningNode -> Bool #

(>) :: LightningNode -> LightningNode -> Bool #

(>=) :: LightningNode -> LightningNode -> Bool #

max :: LightningNode -> LightningNode -> LightningNode #

min :: LightningNode -> LightningNode -> LightningNode #

Ord LightningNode'FeaturesEntry 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: LightningNode'FeaturesEntry -> LightningNode'FeaturesEntry -> Ordering #

(<) :: LightningNode'FeaturesEntry -> LightningNode'FeaturesEntry -> Bool #

(<=) :: LightningNode'FeaturesEntry -> LightningNode'FeaturesEntry -> Bool #

(>) :: LightningNode'FeaturesEntry -> LightningNode'FeaturesEntry -> Bool #

(>=) :: LightningNode'FeaturesEntry -> LightningNode'FeaturesEntry -> Bool #

max :: LightningNode'FeaturesEntry -> LightningNode'FeaturesEntry -> LightningNode'FeaturesEntry #

min :: LightningNode'FeaturesEntry -> LightningNode'FeaturesEntry -> LightningNode'FeaturesEntry #

Ord MPPRecord 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: MPPRecord -> MPPRecord -> Ordering #

(<) :: MPPRecord -> MPPRecord -> Bool #

(<=) :: MPPRecord -> MPPRecord -> Bool #

(>) :: MPPRecord -> MPPRecord -> Bool #

(>=) :: MPPRecord -> MPPRecord -> Bool #

max :: MPPRecord -> MPPRecord -> MPPRecord #

min :: MPPRecord -> MPPRecord -> MPPRecord #

Ord NetworkInfo 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: NetworkInfo -> NetworkInfo -> Ordering #

(<) :: NetworkInfo -> NetworkInfo -> Bool #

(<=) :: NetworkInfo -> NetworkInfo -> Bool #

(>) :: NetworkInfo -> NetworkInfo -> Bool #

(>=) :: NetworkInfo -> NetworkInfo -> Bool #

max :: NetworkInfo -> NetworkInfo -> NetworkInfo #

min :: NetworkInfo -> NetworkInfo -> NetworkInfo #

Ord NetworkInfoRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: NetworkInfoRequest -> NetworkInfoRequest -> Ordering #

(<) :: NetworkInfoRequest -> NetworkInfoRequest -> Bool #

(<=) :: NetworkInfoRequest -> NetworkInfoRequest -> Bool #

(>) :: NetworkInfoRequest -> NetworkInfoRequest -> Bool #

(>=) :: NetworkInfoRequest -> NetworkInfoRequest -> Bool #

max :: NetworkInfoRequest -> NetworkInfoRequest -> NetworkInfoRequest #

min :: NetworkInfoRequest -> NetworkInfoRequest -> NetworkInfoRequest #

Ord NodeAddress 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: NodeAddress -> NodeAddress -> Ordering #

(<) :: NodeAddress -> NodeAddress -> Bool #

(<=) :: NodeAddress -> NodeAddress -> Bool #

(>) :: NodeAddress -> NodeAddress -> Bool #

(>=) :: NodeAddress -> NodeAddress -> Bool #

max :: NodeAddress -> NodeAddress -> NodeAddress #

min :: NodeAddress -> NodeAddress -> NodeAddress #

Ord NodeInfo 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: NodeInfo -> NodeInfo -> Ordering #

(<) :: NodeInfo -> NodeInfo -> Bool #

(<=) :: NodeInfo -> NodeInfo -> Bool #

(>) :: NodeInfo -> NodeInfo -> Bool #

(>=) :: NodeInfo -> NodeInfo -> Bool #

max :: NodeInfo -> NodeInfo -> NodeInfo #

min :: NodeInfo -> NodeInfo -> NodeInfo #

Ord NodeInfoRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: NodeInfoRequest -> NodeInfoRequest -> Ordering #

(<) :: NodeInfoRequest -> NodeInfoRequest -> Bool #

(<=) :: NodeInfoRequest -> NodeInfoRequest -> Bool #

(>) :: NodeInfoRequest -> NodeInfoRequest -> Bool #

(>=) :: NodeInfoRequest -> NodeInfoRequest -> Bool #

max :: NodeInfoRequest -> NodeInfoRequest -> NodeInfoRequest #

min :: NodeInfoRequest -> NodeInfoRequest -> NodeInfoRequest #

Ord NodeMetricType 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: NodeMetricType -> NodeMetricType -> Ordering #

(<) :: NodeMetricType -> NodeMetricType -> Bool #

(<=) :: NodeMetricType -> NodeMetricType -> Bool #

(>) :: NodeMetricType -> NodeMetricType -> Bool #

(>=) :: NodeMetricType -> NodeMetricType -> Bool #

max :: NodeMetricType -> NodeMetricType -> NodeMetricType #

min :: NodeMetricType -> NodeMetricType -> NodeMetricType #

Ord NodeMetricType'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: NodeMetricType'UnrecognizedValue -> NodeMetricType'UnrecognizedValue -> Ordering #

(<) :: NodeMetricType'UnrecognizedValue -> NodeMetricType'UnrecognizedValue -> Bool #

(<=) :: NodeMetricType'UnrecognizedValue -> NodeMetricType'UnrecognizedValue -> Bool #

(>) :: NodeMetricType'UnrecognizedValue -> NodeMetricType'UnrecognizedValue -> Bool #

(>=) :: NodeMetricType'UnrecognizedValue -> NodeMetricType'UnrecognizedValue -> Bool #

max :: NodeMetricType'UnrecognizedValue -> NodeMetricType'UnrecognizedValue -> NodeMetricType'UnrecognizedValue #

min :: NodeMetricType'UnrecognizedValue -> NodeMetricType'UnrecognizedValue -> NodeMetricType'UnrecognizedValue #

Ord NodeMetricsRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: NodeMetricsRequest -> NodeMetricsRequest -> Ordering #

(<) :: NodeMetricsRequest -> NodeMetricsRequest -> Bool #

(<=) :: NodeMetricsRequest -> NodeMetricsRequest -> Bool #

(>) :: NodeMetricsRequest -> NodeMetricsRequest -> Bool #

(>=) :: NodeMetricsRequest -> NodeMetricsRequest -> Bool #

max :: NodeMetricsRequest -> NodeMetricsRequest -> NodeMetricsRequest #

min :: NodeMetricsRequest -> NodeMetricsRequest -> NodeMetricsRequest #

Ord NodeMetricsResponse 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: NodeMetricsResponse -> NodeMetricsResponse -> Ordering #

(<) :: NodeMetricsResponse -> NodeMetricsResponse -> Bool #

(<=) :: NodeMetricsResponse -> NodeMetricsResponse -> Bool #

(>) :: NodeMetricsResponse -> NodeMetricsResponse -> Bool #

(>=) :: NodeMetricsResponse -> NodeMetricsResponse -> Bool #

max :: NodeMetricsResponse -> NodeMetricsResponse -> NodeMetricsResponse #

min :: NodeMetricsResponse -> NodeMetricsResponse -> NodeMetricsResponse #

Ord NodeMetricsResponse'BetweennessCentralityEntry 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: NodeMetricsResponse'BetweennessCentralityEntry -> NodeMetricsResponse'BetweennessCentralityEntry -> Ordering #

(<) :: NodeMetricsResponse'BetweennessCentralityEntry -> NodeMetricsResponse'BetweennessCentralityEntry -> Bool #

(<=) :: NodeMetricsResponse'BetweennessCentralityEntry -> NodeMetricsResponse'BetweennessCentralityEntry -> Bool #

(>) :: NodeMetricsResponse'BetweennessCentralityEntry -> NodeMetricsResponse'BetweennessCentralityEntry -> Bool #

(>=) :: NodeMetricsResponse'BetweennessCentralityEntry -> NodeMetricsResponse'BetweennessCentralityEntry -> Bool #

max :: NodeMetricsResponse'BetweennessCentralityEntry -> NodeMetricsResponse'BetweennessCentralityEntry -> NodeMetricsResponse'BetweennessCentralityEntry #

min :: NodeMetricsResponse'BetweennessCentralityEntry -> NodeMetricsResponse'BetweennessCentralityEntry -> NodeMetricsResponse'BetweennessCentralityEntry #

Ord NodePair 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: NodePair -> NodePair -> Ordering #

(<) :: NodePair -> NodePair -> Bool #

(<=) :: NodePair -> NodePair -> Bool #

(>) :: NodePair -> NodePair -> Bool #

(>=) :: NodePair -> NodePair -> Bool #

max :: NodePair -> NodePair -> NodePair #

min :: NodePair -> NodePair -> NodePair #

Ord NodeUpdate 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: NodeUpdate -> NodeUpdate -> Ordering #

(<) :: NodeUpdate -> NodeUpdate -> Bool #

(<=) :: NodeUpdate -> NodeUpdate -> Bool #

(>) :: NodeUpdate -> NodeUpdate -> Bool #

(>=) :: NodeUpdate -> NodeUpdate -> Bool #

max :: NodeUpdate -> NodeUpdate -> NodeUpdate #

min :: NodeUpdate -> NodeUpdate -> NodeUpdate #

Ord NodeUpdate'FeaturesEntry 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: NodeUpdate'FeaturesEntry -> NodeUpdate'FeaturesEntry -> Ordering #

(<) :: NodeUpdate'FeaturesEntry -> NodeUpdate'FeaturesEntry -> Bool #

(<=) :: NodeUpdate'FeaturesEntry -> NodeUpdate'FeaturesEntry -> Bool #

(>) :: NodeUpdate'FeaturesEntry -> NodeUpdate'FeaturesEntry -> Bool #

(>=) :: NodeUpdate'FeaturesEntry -> NodeUpdate'FeaturesEntry -> Bool #

max :: NodeUpdate'FeaturesEntry -> NodeUpdate'FeaturesEntry -> NodeUpdate'FeaturesEntry #

min :: NodeUpdate'FeaturesEntry -> NodeUpdate'FeaturesEntry -> NodeUpdate'FeaturesEntry #

Ord OutPoint 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: OutPoint -> OutPoint -> Ordering #

(<) :: OutPoint -> OutPoint -> Bool #

(<=) :: OutPoint -> OutPoint -> Bool #

(>) :: OutPoint -> OutPoint -> Bool #

(>=) :: OutPoint -> OutPoint -> Bool #

max :: OutPoint -> OutPoint -> OutPoint #

min :: OutPoint -> OutPoint -> OutPoint #

Ord PendingChannelsRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: PendingChannelsRequest -> PendingChannelsRequest -> Ordering #

(<) :: PendingChannelsRequest -> PendingChannelsRequest -> Bool #

(<=) :: PendingChannelsRequest -> PendingChannelsRequest -> Bool #

(>) :: PendingChannelsRequest -> PendingChannelsRequest -> Bool #

(>=) :: PendingChannelsRequest -> PendingChannelsRequest -> Bool #

max :: PendingChannelsRequest -> PendingChannelsRequest -> PendingChannelsRequest #

min :: PendingChannelsRequest -> PendingChannelsRequest -> PendingChannelsRequest #

Ord PendingChannelsResponse 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: PendingChannelsResponse -> PendingChannelsResponse -> Ordering #

(<) :: PendingChannelsResponse -> PendingChannelsResponse -> Bool #

(<=) :: PendingChannelsResponse -> PendingChannelsResponse -> Bool #

(>) :: PendingChannelsResponse -> PendingChannelsResponse -> Bool #

(>=) :: PendingChannelsResponse -> PendingChannelsResponse -> Bool #

max :: PendingChannelsResponse -> PendingChannelsResponse -> PendingChannelsResponse #

min :: PendingChannelsResponse -> PendingChannelsResponse -> PendingChannelsResponse #

Ord PendingChannelsResponse'ClosedChannel 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: PendingChannelsResponse'ClosedChannel -> PendingChannelsResponse'ClosedChannel -> Ordering #

(<) :: PendingChannelsResponse'ClosedChannel -> PendingChannelsResponse'ClosedChannel -> Bool #

(<=) :: PendingChannelsResponse'ClosedChannel -> PendingChannelsResponse'ClosedChannel -> Bool #

(>) :: PendingChannelsResponse'ClosedChannel -> PendingChannelsResponse'ClosedChannel -> Bool #

(>=) :: PendingChannelsResponse'ClosedChannel -> PendingChannelsResponse'ClosedChannel -> Bool #

max :: PendingChannelsResponse'ClosedChannel -> PendingChannelsResponse'ClosedChannel -> PendingChannelsResponse'ClosedChannel #

min :: PendingChannelsResponse'ClosedChannel -> PendingChannelsResponse'ClosedChannel -> PendingChannelsResponse'ClosedChannel #

Ord PendingChannelsResponse'Commitments 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: PendingChannelsResponse'Commitments -> PendingChannelsResponse'Commitments -> Ordering #

(<) :: PendingChannelsResponse'Commitments -> PendingChannelsResponse'Commitments -> Bool #

(<=) :: PendingChannelsResponse'Commitments -> PendingChannelsResponse'Commitments -> Bool #

(>) :: PendingChannelsResponse'Commitments -> PendingChannelsResponse'Commitments -> Bool #

(>=) :: PendingChannelsResponse'Commitments -> PendingChannelsResponse'Commitments -> Bool #

max :: PendingChannelsResponse'Commitments -> PendingChannelsResponse'Commitments -> PendingChannelsResponse'Commitments #

min :: PendingChannelsResponse'Commitments -> PendingChannelsResponse'Commitments -> PendingChannelsResponse'Commitments #

Ord PendingChannelsResponse'ForceClosedChannel 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: PendingChannelsResponse'ForceClosedChannel -> PendingChannelsResponse'ForceClosedChannel -> Ordering #

(<) :: PendingChannelsResponse'ForceClosedChannel -> PendingChannelsResponse'ForceClosedChannel -> Bool #

(<=) :: PendingChannelsResponse'ForceClosedChannel -> PendingChannelsResponse'ForceClosedChannel -> Bool #

(>) :: PendingChannelsResponse'ForceClosedChannel -> PendingChannelsResponse'ForceClosedChannel -> Bool #

(>=) :: PendingChannelsResponse'ForceClosedChannel -> PendingChannelsResponse'ForceClosedChannel -> Bool #

max :: PendingChannelsResponse'ForceClosedChannel -> PendingChannelsResponse'ForceClosedChannel -> PendingChannelsResponse'ForceClosedChannel #

min :: PendingChannelsResponse'ForceClosedChannel -> PendingChannelsResponse'ForceClosedChannel -> PendingChannelsResponse'ForceClosedChannel #

Ord PendingChannelsResponse'ForceClosedChannel'AnchorState 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: PendingChannelsResponse'ForceClosedChannel'AnchorState -> PendingChannelsResponse'ForceClosedChannel'AnchorState -> Ordering #

(<) :: PendingChannelsResponse'ForceClosedChannel'AnchorState -> PendingChannelsResponse'ForceClosedChannel'AnchorState -> Bool #

(<=) :: PendingChannelsResponse'ForceClosedChannel'AnchorState -> PendingChannelsResponse'ForceClosedChannel'AnchorState -> Bool #

(>) :: PendingChannelsResponse'ForceClosedChannel'AnchorState -> PendingChannelsResponse'ForceClosedChannel'AnchorState -> Bool #

(>=) :: PendingChannelsResponse'ForceClosedChannel'AnchorState -> PendingChannelsResponse'ForceClosedChannel'AnchorState -> Bool #

max :: PendingChannelsResponse'ForceClosedChannel'AnchorState -> PendingChannelsResponse'ForceClosedChannel'AnchorState -> PendingChannelsResponse'ForceClosedChannel'AnchorState #

min :: PendingChannelsResponse'ForceClosedChannel'AnchorState -> PendingChannelsResponse'ForceClosedChannel'AnchorState -> PendingChannelsResponse'ForceClosedChannel'AnchorState #

Ord PendingChannelsResponse'ForceClosedChannel'AnchorState'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: PendingChannelsResponse'ForceClosedChannel'AnchorState'UnrecognizedValue -> PendingChannelsResponse'ForceClosedChannel'AnchorState'UnrecognizedValue -> Ordering #

(<) :: PendingChannelsResponse'ForceClosedChannel'AnchorState'UnrecognizedValue -> PendingChannelsResponse'ForceClosedChannel'AnchorState'UnrecognizedValue -> Bool #

(<=) :: PendingChannelsResponse'ForceClosedChannel'AnchorState'UnrecognizedValue -> PendingChannelsResponse'ForceClosedChannel'AnchorState'UnrecognizedValue -> Bool #

(>) :: PendingChannelsResponse'ForceClosedChannel'AnchorState'UnrecognizedValue -> PendingChannelsResponse'ForceClosedChannel'AnchorState'UnrecognizedValue -> Bool #

(>=) :: PendingChannelsResponse'ForceClosedChannel'AnchorState'UnrecognizedValue -> PendingChannelsResponse'ForceClosedChannel'AnchorState'UnrecognizedValue -> Bool #

max :: PendingChannelsResponse'ForceClosedChannel'AnchorState'UnrecognizedValue -> PendingChannelsResponse'ForceClosedChannel'AnchorState'UnrecognizedValue -> PendingChannelsResponse'ForceClosedChannel'AnchorState'UnrecognizedValue #

min :: PendingChannelsResponse'ForceClosedChannel'AnchorState'UnrecognizedValue -> PendingChannelsResponse'ForceClosedChannel'AnchorState'UnrecognizedValue -> PendingChannelsResponse'ForceClosedChannel'AnchorState'UnrecognizedValue #

Ord PendingChannelsResponse'PendingChannel 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: PendingChannelsResponse'PendingChannel -> PendingChannelsResponse'PendingChannel -> Ordering #

(<) :: PendingChannelsResponse'PendingChannel -> PendingChannelsResponse'PendingChannel -> Bool #

(<=) :: PendingChannelsResponse'PendingChannel -> PendingChannelsResponse'PendingChannel -> Bool #

(>) :: PendingChannelsResponse'PendingChannel -> PendingChannelsResponse'PendingChannel -> Bool #

(>=) :: PendingChannelsResponse'PendingChannel -> PendingChannelsResponse'PendingChannel -> Bool #

max :: PendingChannelsResponse'PendingChannel -> PendingChannelsResponse'PendingChannel -> PendingChannelsResponse'PendingChannel #

min :: PendingChannelsResponse'PendingChannel -> PendingChannelsResponse'PendingChannel -> PendingChannelsResponse'PendingChannel #

Ord PendingChannelsResponse'PendingOpenChannel 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: PendingChannelsResponse'PendingOpenChannel -> PendingChannelsResponse'PendingOpenChannel -> Ordering #

(<) :: PendingChannelsResponse'PendingOpenChannel -> PendingChannelsResponse'PendingOpenChannel -> Bool #

(<=) :: PendingChannelsResponse'PendingOpenChannel -> PendingChannelsResponse'PendingOpenChannel -> Bool #

(>) :: PendingChannelsResponse'PendingOpenChannel -> PendingChannelsResponse'PendingOpenChannel -> Bool #

(>=) :: PendingChannelsResponse'PendingOpenChannel -> PendingChannelsResponse'PendingOpenChannel -> Bool #

max :: PendingChannelsResponse'PendingOpenChannel -> PendingChannelsResponse'PendingOpenChannel -> PendingChannelsResponse'PendingOpenChannel #

min :: PendingChannelsResponse'PendingOpenChannel -> PendingChannelsResponse'PendingOpenChannel -> PendingChannelsResponse'PendingOpenChannel #

Ord PendingChannelsResponse'WaitingCloseChannel 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: PendingChannelsResponse'WaitingCloseChannel -> PendingChannelsResponse'WaitingCloseChannel -> Ordering #

(<) :: PendingChannelsResponse'WaitingCloseChannel -> PendingChannelsResponse'WaitingCloseChannel -> Bool #

(<=) :: PendingChannelsResponse'WaitingCloseChannel -> PendingChannelsResponse'WaitingCloseChannel -> Bool #

(>) :: PendingChannelsResponse'WaitingCloseChannel -> PendingChannelsResponse'WaitingCloseChannel -> Bool #

(>=) :: PendingChannelsResponse'WaitingCloseChannel -> PendingChannelsResponse'WaitingCloseChannel -> Bool #

max :: PendingChannelsResponse'WaitingCloseChannel -> PendingChannelsResponse'WaitingCloseChannel -> PendingChannelsResponse'WaitingCloseChannel #

min :: PendingChannelsResponse'WaitingCloseChannel -> PendingChannelsResponse'WaitingCloseChannel -> PendingChannelsResponse'WaitingCloseChannel #

Ord PendingHTLC 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: PendingHTLC -> PendingHTLC -> Ordering #

(<) :: PendingHTLC -> PendingHTLC -> Bool #

(<=) :: PendingHTLC -> PendingHTLC -> Bool #

(>) :: PendingHTLC -> PendingHTLC -> Bool #

(>=) :: PendingHTLC -> PendingHTLC -> Bool #

max :: PendingHTLC -> PendingHTLC -> PendingHTLC #

min :: PendingHTLC -> PendingHTLC -> PendingHTLC #

Ord PendingUpdate 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: PendingUpdate -> PendingUpdate -> Ordering #

(<) :: PendingUpdate -> PendingUpdate -> Bool #

(<=) :: PendingUpdate -> PendingUpdate -> Bool #

(>) :: PendingUpdate -> PendingUpdate -> Bool #

(>=) :: PendingUpdate -> PendingUpdate -> Bool #

max :: PendingUpdate -> PendingUpdate -> PendingUpdate #

min :: PendingUpdate -> PendingUpdate -> PendingUpdate #

Ord PsbtShim 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: PsbtShim -> PsbtShim -> Ordering #

(<) :: PsbtShim -> PsbtShim -> Bool #

(<=) :: PsbtShim -> PsbtShim -> Bool #

(>) :: PsbtShim -> PsbtShim -> Bool #

(>=) :: PsbtShim -> PsbtShim -> Bool #

max :: PsbtShim -> PsbtShim -> PsbtShim #

min :: PsbtShim -> PsbtShim -> PsbtShim #

Ord QueryRoutesRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: QueryRoutesRequest -> QueryRoutesRequest -> Ordering #

(<) :: QueryRoutesRequest -> QueryRoutesRequest -> Bool #

(<=) :: QueryRoutesRequest -> QueryRoutesRequest -> Bool #

(>) :: QueryRoutesRequest -> QueryRoutesRequest -> Bool #

(>=) :: QueryRoutesRequest -> QueryRoutesRequest -> Bool #

max :: QueryRoutesRequest -> QueryRoutesRequest -> QueryRoutesRequest #

min :: QueryRoutesRequest -> QueryRoutesRequest -> QueryRoutesRequest #

Ord QueryRoutesRequest'DestCustomRecordsEntry 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: QueryRoutesRequest'DestCustomRecordsEntry -> QueryRoutesRequest'DestCustomRecordsEntry -> Ordering #

(<) :: QueryRoutesRequest'DestCustomRecordsEntry -> QueryRoutesRequest'DestCustomRecordsEntry -> Bool #

(<=) :: QueryRoutesRequest'DestCustomRecordsEntry -> QueryRoutesRequest'DestCustomRecordsEntry -> Bool #

(>) :: QueryRoutesRequest'DestCustomRecordsEntry -> QueryRoutesRequest'DestCustomRecordsEntry -> Bool #

(>=) :: QueryRoutesRequest'DestCustomRecordsEntry -> QueryRoutesRequest'DestCustomRecordsEntry -> Bool #

max :: QueryRoutesRequest'DestCustomRecordsEntry -> QueryRoutesRequest'DestCustomRecordsEntry -> QueryRoutesRequest'DestCustomRecordsEntry #

min :: QueryRoutesRequest'DestCustomRecordsEntry -> QueryRoutesRequest'DestCustomRecordsEntry -> QueryRoutesRequest'DestCustomRecordsEntry #

Ord QueryRoutesResponse 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: QueryRoutesResponse -> QueryRoutesResponse -> Ordering #

(<) :: QueryRoutesResponse -> QueryRoutesResponse -> Bool #

(<=) :: QueryRoutesResponse -> QueryRoutesResponse -> Bool #

(>) :: QueryRoutesResponse -> QueryRoutesResponse -> Bool #

(>=) :: QueryRoutesResponse -> QueryRoutesResponse -> Bool #

max :: QueryRoutesResponse -> QueryRoutesResponse -> QueryRoutesResponse #

min :: QueryRoutesResponse -> QueryRoutesResponse -> QueryRoutesResponse #

Ord Resolution 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: Resolution -> Resolution -> Ordering #

(<) :: Resolution -> Resolution -> Bool #

(<=) :: Resolution -> Resolution -> Bool #

(>) :: Resolution -> Resolution -> Bool #

(>=) :: Resolution -> Resolution -> Bool #

max :: Resolution -> Resolution -> Resolution #

min :: Resolution -> Resolution -> Resolution #

Ord ResolutionOutcome 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: ResolutionOutcome -> ResolutionOutcome -> Ordering #

(<) :: ResolutionOutcome -> ResolutionOutcome -> Bool #

(<=) :: ResolutionOutcome -> ResolutionOutcome -> Bool #

(>) :: ResolutionOutcome -> ResolutionOutcome -> Bool #

(>=) :: ResolutionOutcome -> ResolutionOutcome -> Bool #

max :: ResolutionOutcome -> ResolutionOutcome -> ResolutionOutcome #

min :: ResolutionOutcome -> ResolutionOutcome -> ResolutionOutcome #

Ord ResolutionOutcome'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: ResolutionOutcome'UnrecognizedValue -> ResolutionOutcome'UnrecognizedValue -> Ordering #

(<) :: ResolutionOutcome'UnrecognizedValue -> ResolutionOutcome'UnrecognizedValue -> Bool #

(<=) :: ResolutionOutcome'UnrecognizedValue -> ResolutionOutcome'UnrecognizedValue -> Bool #

(>) :: ResolutionOutcome'UnrecognizedValue -> ResolutionOutcome'UnrecognizedValue -> Bool #

(>=) :: ResolutionOutcome'UnrecognizedValue -> ResolutionOutcome'UnrecognizedValue -> Bool #

max :: ResolutionOutcome'UnrecognizedValue -> ResolutionOutcome'UnrecognizedValue -> ResolutionOutcome'UnrecognizedValue #

min :: ResolutionOutcome'UnrecognizedValue -> ResolutionOutcome'UnrecognizedValue -> ResolutionOutcome'UnrecognizedValue #

Ord ResolutionType 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: ResolutionType -> ResolutionType -> Ordering #

(<) :: ResolutionType -> ResolutionType -> Bool #

(<=) :: ResolutionType -> ResolutionType -> Bool #

(>) :: ResolutionType -> ResolutionType -> Bool #

(>=) :: ResolutionType -> ResolutionType -> Bool #

max :: ResolutionType -> ResolutionType -> ResolutionType #

min :: ResolutionType -> ResolutionType -> ResolutionType #

Ord ResolutionType'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: ResolutionType'UnrecognizedValue -> ResolutionType'UnrecognizedValue -> Ordering #

(<) :: ResolutionType'UnrecognizedValue -> ResolutionType'UnrecognizedValue -> Bool #

(<=) :: ResolutionType'UnrecognizedValue -> ResolutionType'UnrecognizedValue -> Bool #

(>) :: ResolutionType'UnrecognizedValue -> ResolutionType'UnrecognizedValue -> Bool #

(>=) :: ResolutionType'UnrecognizedValue -> ResolutionType'UnrecognizedValue -> Bool #

max :: ResolutionType'UnrecognizedValue -> ResolutionType'UnrecognizedValue -> ResolutionType'UnrecognizedValue #

min :: ResolutionType'UnrecognizedValue -> ResolutionType'UnrecognizedValue -> ResolutionType'UnrecognizedValue #

Ord Route 
Instance details

Defined in Proto.Lnrpc.Ln0

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 RouteHint 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: RouteHint -> RouteHint -> Ordering #

(<) :: RouteHint -> RouteHint -> Bool #

(<=) :: RouteHint -> RouteHint -> Bool #

(>) :: RouteHint -> RouteHint -> Bool #

(>=) :: RouteHint -> RouteHint -> Bool #

max :: RouteHint -> RouteHint -> RouteHint #

min :: RouteHint -> RouteHint -> RouteHint #

Ord RoutingPolicy 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: RoutingPolicy -> RoutingPolicy -> Ordering #

(<) :: RoutingPolicy -> RoutingPolicy -> Bool #

(<=) :: RoutingPolicy -> RoutingPolicy -> Bool #

(>) :: RoutingPolicy -> RoutingPolicy -> Bool #

(>=) :: RoutingPolicy -> RoutingPolicy -> Bool #

max :: RoutingPolicy -> RoutingPolicy -> RoutingPolicy #

min :: RoutingPolicy -> RoutingPolicy -> RoutingPolicy #

Ord StopRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: StopRequest -> StopRequest -> Ordering #

(<) :: StopRequest -> StopRequest -> Bool #

(<=) :: StopRequest -> StopRequest -> Bool #

(>) :: StopRequest -> StopRequest -> Bool #

(>=) :: StopRequest -> StopRequest -> Bool #

max :: StopRequest -> StopRequest -> StopRequest #

min :: StopRequest -> StopRequest -> StopRequest #

Ord StopResponse 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: StopResponse -> StopResponse -> Ordering #

(<) :: StopResponse -> StopResponse -> Bool #

(<=) :: StopResponse -> StopResponse -> Bool #

(>) :: StopResponse -> StopResponse -> Bool #

(>=) :: StopResponse -> StopResponse -> Bool #

max :: StopResponse -> StopResponse -> StopResponse #

min :: StopResponse -> StopResponse -> StopResponse #

Ord WalletAccountBalance 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: WalletAccountBalance -> WalletAccountBalance -> Ordering #

(<) :: WalletAccountBalance -> WalletAccountBalance -> Bool #

(<=) :: WalletAccountBalance -> WalletAccountBalance -> Bool #

(>) :: WalletAccountBalance -> WalletAccountBalance -> Bool #

(>=) :: WalletAccountBalance -> WalletAccountBalance -> Bool #

max :: WalletAccountBalance -> WalletAccountBalance -> WalletAccountBalance #

min :: WalletAccountBalance -> WalletAccountBalance -> WalletAccountBalance #

Ord WalletBalanceRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: WalletBalanceRequest -> WalletBalanceRequest -> Ordering #

(<) :: WalletBalanceRequest -> WalletBalanceRequest -> Bool #

(<=) :: WalletBalanceRequest -> WalletBalanceRequest -> Bool #

(>) :: WalletBalanceRequest -> WalletBalanceRequest -> Bool #

(>=) :: WalletBalanceRequest -> WalletBalanceRequest -> Bool #

max :: WalletBalanceRequest -> WalletBalanceRequest -> WalletBalanceRequest #

min :: WalletBalanceRequest -> WalletBalanceRequest -> WalletBalanceRequest #

Ord WalletBalanceResponse 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: WalletBalanceResponse -> WalletBalanceResponse -> Ordering #

(<) :: WalletBalanceResponse -> WalletBalanceResponse -> Bool #

(<=) :: WalletBalanceResponse -> WalletBalanceResponse -> Bool #

(>) :: WalletBalanceResponse -> WalletBalanceResponse -> Bool #

(>=) :: WalletBalanceResponse -> WalletBalanceResponse -> Bool #

max :: WalletBalanceResponse -> WalletBalanceResponse -> WalletBalanceResponse #

min :: WalletBalanceResponse -> WalletBalanceResponse -> WalletBalanceResponse #

Ord WalletBalanceResponse'AccountBalanceEntry 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

compare :: WalletBalanceResponse'AccountBalanceEntry -> WalletBalanceResponse'AccountBalanceEntry -> Ordering #

(<) :: WalletBalanceResponse'AccountBalanceEntry -> WalletBalanceResponse'AccountBalanceEntry -> Bool #

(<=) :: WalletBalanceResponse'AccountBalanceEntry -> WalletBalanceResponse'AccountBalanceEntry -> Bool #

(>) :: WalletBalanceResponse'AccountBalanceEntry -> WalletBalanceResponse'AccountBalanceEntry -> Bool #

(>=) :: WalletBalanceResponse'AccountBalanceEntry -> WalletBalanceResponse'AccountBalanceEntry -> Bool #

max :: WalletBalanceResponse'AccountBalanceEntry -> WalletBalanceResponse'AccountBalanceEntry -> WalletBalanceResponse'AccountBalanceEntry #

min :: WalletBalanceResponse'AccountBalanceEntry -> WalletBalanceResponse'AccountBalanceEntry -> WalletBalanceResponse'AccountBalanceEntry #

Ord AMP 
Instance details

Defined in Proto.Lnrpc.Ln1

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 AMPInvoiceState 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: AMPInvoiceState -> AMPInvoiceState -> Ordering #

(<) :: AMPInvoiceState -> AMPInvoiceState -> Bool #

(<=) :: AMPInvoiceState -> AMPInvoiceState -> Bool #

(>) :: AMPInvoiceState -> AMPInvoiceState -> Bool #

(>=) :: AMPInvoiceState -> AMPInvoiceState -> Bool #

max :: AMPInvoiceState -> AMPInvoiceState -> AMPInvoiceState #

min :: AMPInvoiceState -> AMPInvoiceState -> AMPInvoiceState #

Ord AbandonChannelRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: AbandonChannelRequest -> AbandonChannelRequest -> Ordering #

(<) :: AbandonChannelRequest -> AbandonChannelRequest -> Bool #

(<=) :: AbandonChannelRequest -> AbandonChannelRequest -> Bool #

(>) :: AbandonChannelRequest -> AbandonChannelRequest -> Bool #

(>=) :: AbandonChannelRequest -> AbandonChannelRequest -> Bool #

max :: AbandonChannelRequest -> AbandonChannelRequest -> AbandonChannelRequest #

min :: AbandonChannelRequest -> AbandonChannelRequest -> AbandonChannelRequest #

Ord AbandonChannelResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: AbandonChannelResponse -> AbandonChannelResponse -> Ordering #

(<) :: AbandonChannelResponse -> AbandonChannelResponse -> Bool #

(<=) :: AbandonChannelResponse -> AbandonChannelResponse -> Bool #

(>) :: AbandonChannelResponse -> AbandonChannelResponse -> Bool #

(>=) :: AbandonChannelResponse -> AbandonChannelResponse -> Bool #

max :: AbandonChannelResponse -> AbandonChannelResponse -> AbandonChannelResponse #

min :: AbandonChannelResponse -> AbandonChannelResponse -> AbandonChannelResponse #

Ord AddInvoiceResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: AddInvoiceResponse -> AddInvoiceResponse -> Ordering #

(<) :: AddInvoiceResponse -> AddInvoiceResponse -> Bool #

(<=) :: AddInvoiceResponse -> AddInvoiceResponse -> Bool #

(>) :: AddInvoiceResponse -> AddInvoiceResponse -> Bool #

(>=) :: AddInvoiceResponse -> AddInvoiceResponse -> Bool #

max :: AddInvoiceResponse -> AddInvoiceResponse -> AddInvoiceResponse #

min :: AddInvoiceResponse -> AddInvoiceResponse -> AddInvoiceResponse #

Ord BakeMacaroonRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: BakeMacaroonRequest -> BakeMacaroonRequest -> Ordering #

(<) :: BakeMacaroonRequest -> BakeMacaroonRequest -> Bool #

(<=) :: BakeMacaroonRequest -> BakeMacaroonRequest -> Bool #

(>) :: BakeMacaroonRequest -> BakeMacaroonRequest -> Bool #

(>=) :: BakeMacaroonRequest -> BakeMacaroonRequest -> Bool #

max :: BakeMacaroonRequest -> BakeMacaroonRequest -> BakeMacaroonRequest #

min :: BakeMacaroonRequest -> BakeMacaroonRequest -> BakeMacaroonRequest #

Ord BakeMacaroonResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: BakeMacaroonResponse -> BakeMacaroonResponse -> Ordering #

(<) :: BakeMacaroonResponse -> BakeMacaroonResponse -> Bool #

(<=) :: BakeMacaroonResponse -> BakeMacaroonResponse -> Bool #

(>) :: BakeMacaroonResponse -> BakeMacaroonResponse -> Bool #

(>=) :: BakeMacaroonResponse -> BakeMacaroonResponse -> Bool #

max :: BakeMacaroonResponse -> BakeMacaroonResponse -> BakeMacaroonResponse #

min :: BakeMacaroonResponse -> BakeMacaroonResponse -> BakeMacaroonResponse #

Ord ChanBackupExportRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: ChanBackupExportRequest -> ChanBackupExportRequest -> Ordering #

(<) :: ChanBackupExportRequest -> ChanBackupExportRequest -> Bool #

(<=) :: ChanBackupExportRequest -> ChanBackupExportRequest -> Bool #

(>) :: ChanBackupExportRequest -> ChanBackupExportRequest -> Bool #

(>=) :: ChanBackupExportRequest -> ChanBackupExportRequest -> Bool #

max :: ChanBackupExportRequest -> ChanBackupExportRequest -> ChanBackupExportRequest #

min :: ChanBackupExportRequest -> ChanBackupExportRequest -> ChanBackupExportRequest #

Ord ChanBackupSnapshot 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: ChanBackupSnapshot -> ChanBackupSnapshot -> Ordering #

(<) :: ChanBackupSnapshot -> ChanBackupSnapshot -> Bool #

(<=) :: ChanBackupSnapshot -> ChanBackupSnapshot -> Bool #

(>) :: ChanBackupSnapshot -> ChanBackupSnapshot -> Bool #

(>=) :: ChanBackupSnapshot -> ChanBackupSnapshot -> Bool #

max :: ChanBackupSnapshot -> ChanBackupSnapshot -> ChanBackupSnapshot #

min :: ChanBackupSnapshot -> ChanBackupSnapshot -> ChanBackupSnapshot #

Ord ChannelBackup 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: ChannelBackup -> ChannelBackup -> Ordering #

(<) :: ChannelBackup -> ChannelBackup -> Bool #

(<=) :: ChannelBackup -> ChannelBackup -> Bool #

(>) :: ChannelBackup -> ChannelBackup -> Bool #

(>=) :: ChannelBackup -> ChannelBackup -> Bool #

max :: ChannelBackup -> ChannelBackup -> ChannelBackup #

min :: ChannelBackup -> ChannelBackup -> ChannelBackup #

Ord ChannelBackupSubscription 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: ChannelBackupSubscription -> ChannelBackupSubscription -> Ordering #

(<) :: ChannelBackupSubscription -> ChannelBackupSubscription -> Bool #

(<=) :: ChannelBackupSubscription -> ChannelBackupSubscription -> Bool #

(>) :: ChannelBackupSubscription -> ChannelBackupSubscription -> Bool #

(>=) :: ChannelBackupSubscription -> ChannelBackupSubscription -> Bool #

max :: ChannelBackupSubscription -> ChannelBackupSubscription -> ChannelBackupSubscription #

min :: ChannelBackupSubscription -> ChannelBackupSubscription -> ChannelBackupSubscription #

Ord ChannelBackups 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: ChannelBackups -> ChannelBackups -> Ordering #

(<) :: ChannelBackups -> ChannelBackups -> Bool #

(<=) :: ChannelBackups -> ChannelBackups -> Bool #

(>) :: ChannelBackups -> ChannelBackups -> Bool #

(>=) :: ChannelBackups -> ChannelBackups -> Bool #

max :: ChannelBackups -> ChannelBackups -> ChannelBackups #

min :: ChannelBackups -> ChannelBackups -> ChannelBackups #

Ord ChannelFeeReport 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: ChannelFeeReport -> ChannelFeeReport -> Ordering #

(<) :: ChannelFeeReport -> ChannelFeeReport -> Bool #

(<=) :: ChannelFeeReport -> ChannelFeeReport -> Bool #

(>) :: ChannelFeeReport -> ChannelFeeReport -> Bool #

(>=) :: ChannelFeeReport -> ChannelFeeReport -> Bool #

max :: ChannelFeeReport -> ChannelFeeReport -> ChannelFeeReport #

min :: ChannelFeeReport -> ChannelFeeReport -> ChannelFeeReport #

Ord ChannelUpdate 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: ChannelUpdate -> ChannelUpdate -> Ordering #

(<) :: ChannelUpdate -> ChannelUpdate -> Bool #

(<=) :: ChannelUpdate -> ChannelUpdate -> Bool #

(>) :: ChannelUpdate -> ChannelUpdate -> Bool #

(>=) :: ChannelUpdate -> ChannelUpdate -> Bool #

max :: ChannelUpdate -> ChannelUpdate -> ChannelUpdate #

min :: ChannelUpdate -> ChannelUpdate -> ChannelUpdate #

Ord CheckMacPermRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: CheckMacPermRequest -> CheckMacPermRequest -> Ordering #

(<) :: CheckMacPermRequest -> CheckMacPermRequest -> Bool #

(<=) :: CheckMacPermRequest -> CheckMacPermRequest -> Bool #

(>) :: CheckMacPermRequest -> CheckMacPermRequest -> Bool #

(>=) :: CheckMacPermRequest -> CheckMacPermRequest -> Bool #

max :: CheckMacPermRequest -> CheckMacPermRequest -> CheckMacPermRequest #

min :: CheckMacPermRequest -> CheckMacPermRequest -> CheckMacPermRequest #

Ord CheckMacPermResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: CheckMacPermResponse -> CheckMacPermResponse -> Ordering #

(<) :: CheckMacPermResponse -> CheckMacPermResponse -> Bool #

(<=) :: CheckMacPermResponse -> CheckMacPermResponse -> Bool #

(>) :: CheckMacPermResponse -> CheckMacPermResponse -> Bool #

(>=) :: CheckMacPermResponse -> CheckMacPermResponse -> Bool #

max :: CheckMacPermResponse -> CheckMacPermResponse -> CheckMacPermResponse #

min :: CheckMacPermResponse -> CheckMacPermResponse -> CheckMacPermResponse #

Ord DebugLevelRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: DebugLevelRequest -> DebugLevelRequest -> Ordering #

(<) :: DebugLevelRequest -> DebugLevelRequest -> Bool #

(<=) :: DebugLevelRequest -> DebugLevelRequest -> Bool #

(>) :: DebugLevelRequest -> DebugLevelRequest -> Bool #

(>=) :: DebugLevelRequest -> DebugLevelRequest -> Bool #

max :: DebugLevelRequest -> DebugLevelRequest -> DebugLevelRequest #

min :: DebugLevelRequest -> DebugLevelRequest -> DebugLevelRequest #

Ord DebugLevelResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: DebugLevelResponse -> DebugLevelResponse -> Ordering #

(<) :: DebugLevelResponse -> DebugLevelResponse -> Bool #

(<=) :: DebugLevelResponse -> DebugLevelResponse -> Bool #

(>) :: DebugLevelResponse -> DebugLevelResponse -> Bool #

(>=) :: DebugLevelResponse -> DebugLevelResponse -> Bool #

max :: DebugLevelResponse -> DebugLevelResponse -> DebugLevelResponse #

min :: DebugLevelResponse -> DebugLevelResponse -> DebugLevelResponse #

Ord DeleteAllPaymentsRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: DeleteAllPaymentsRequest -> DeleteAllPaymentsRequest -> Ordering #

(<) :: DeleteAllPaymentsRequest -> DeleteAllPaymentsRequest -> Bool #

(<=) :: DeleteAllPaymentsRequest -> DeleteAllPaymentsRequest -> Bool #

(>) :: DeleteAllPaymentsRequest -> DeleteAllPaymentsRequest -> Bool #

(>=) :: DeleteAllPaymentsRequest -> DeleteAllPaymentsRequest -> Bool #

max :: DeleteAllPaymentsRequest -> DeleteAllPaymentsRequest -> DeleteAllPaymentsRequest #

min :: DeleteAllPaymentsRequest -> DeleteAllPaymentsRequest -> DeleteAllPaymentsRequest #

Ord DeleteAllPaymentsResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: DeleteAllPaymentsResponse -> DeleteAllPaymentsResponse -> Ordering #

(<) :: DeleteAllPaymentsResponse -> DeleteAllPaymentsResponse -> Bool #

(<=) :: DeleteAllPaymentsResponse -> DeleteAllPaymentsResponse -> Bool #

(>) :: DeleteAllPaymentsResponse -> DeleteAllPaymentsResponse -> Bool #

(>=) :: DeleteAllPaymentsResponse -> DeleteAllPaymentsResponse -> Bool #

max :: DeleteAllPaymentsResponse -> DeleteAllPaymentsResponse -> DeleteAllPaymentsResponse #

min :: DeleteAllPaymentsResponse -> DeleteAllPaymentsResponse -> DeleteAllPaymentsResponse #

Ord DeleteMacaroonIDRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: DeleteMacaroonIDRequest -> DeleteMacaroonIDRequest -> Ordering #

(<) :: DeleteMacaroonIDRequest -> DeleteMacaroonIDRequest -> Bool #

(<=) :: DeleteMacaroonIDRequest -> DeleteMacaroonIDRequest -> Bool #

(>) :: DeleteMacaroonIDRequest -> DeleteMacaroonIDRequest -> Bool #

(>=) :: DeleteMacaroonIDRequest -> DeleteMacaroonIDRequest -> Bool #

max :: DeleteMacaroonIDRequest -> DeleteMacaroonIDRequest -> DeleteMacaroonIDRequest #

min :: DeleteMacaroonIDRequest -> DeleteMacaroonIDRequest -> DeleteMacaroonIDRequest #

Ord DeleteMacaroonIDResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: DeleteMacaroonIDResponse -> DeleteMacaroonIDResponse -> Ordering #

(<) :: DeleteMacaroonIDResponse -> DeleteMacaroonIDResponse -> Bool #

(<=) :: DeleteMacaroonIDResponse -> DeleteMacaroonIDResponse -> Bool #

(>) :: DeleteMacaroonIDResponse -> DeleteMacaroonIDResponse -> Bool #

(>=) :: DeleteMacaroonIDResponse -> DeleteMacaroonIDResponse -> Bool #

max :: DeleteMacaroonIDResponse -> DeleteMacaroonIDResponse -> DeleteMacaroonIDResponse #

min :: DeleteMacaroonIDResponse -> DeleteMacaroonIDResponse -> DeleteMacaroonIDResponse #

Ord DeletePaymentRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: DeletePaymentRequest -> DeletePaymentRequest -> Ordering #

(<) :: DeletePaymentRequest -> DeletePaymentRequest -> Bool #

(<=) :: DeletePaymentRequest -> DeletePaymentRequest -> Bool #

(>) :: DeletePaymentRequest -> DeletePaymentRequest -> Bool #

(>=) :: DeletePaymentRequest -> DeletePaymentRequest -> Bool #

max :: DeletePaymentRequest -> DeletePaymentRequest -> DeletePaymentRequest #

min :: DeletePaymentRequest -> DeletePaymentRequest -> DeletePaymentRequest #

Ord DeletePaymentResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: DeletePaymentResponse -> DeletePaymentResponse -> Ordering #

(<) :: DeletePaymentResponse -> DeletePaymentResponse -> Bool #

(<=) :: DeletePaymentResponse -> DeletePaymentResponse -> Bool #

(>) :: DeletePaymentResponse -> DeletePaymentResponse -> Bool #

(>=) :: DeletePaymentResponse -> DeletePaymentResponse -> Bool #

max :: DeletePaymentResponse -> DeletePaymentResponse -> DeletePaymentResponse #

min :: DeletePaymentResponse -> DeletePaymentResponse -> DeletePaymentResponse #

Ord ExportChannelBackupRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: ExportChannelBackupRequest -> ExportChannelBackupRequest -> Ordering #

(<) :: ExportChannelBackupRequest -> ExportChannelBackupRequest -> Bool #

(<=) :: ExportChannelBackupRequest -> ExportChannelBackupRequest -> Bool #

(>) :: ExportChannelBackupRequest -> ExportChannelBackupRequest -> Bool #

(>=) :: ExportChannelBackupRequest -> ExportChannelBackupRequest -> Bool #

max :: ExportChannelBackupRequest -> ExportChannelBackupRequest -> ExportChannelBackupRequest #

min :: ExportChannelBackupRequest -> ExportChannelBackupRequest -> ExportChannelBackupRequest #

Ord FailedUpdate 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: FailedUpdate -> FailedUpdate -> Ordering #

(<) :: FailedUpdate -> FailedUpdate -> Bool #

(<=) :: FailedUpdate -> FailedUpdate -> Bool #

(>) :: FailedUpdate -> FailedUpdate -> Bool #

(>=) :: FailedUpdate -> FailedUpdate -> Bool #

max :: FailedUpdate -> FailedUpdate -> FailedUpdate #

min :: FailedUpdate -> FailedUpdate -> FailedUpdate #

Ord Failure 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: Failure -> Failure -> Ordering #

(<) :: Failure -> Failure -> Bool #

(<=) :: Failure -> Failure -> Bool #

(>) :: Failure -> Failure -> Bool #

(>=) :: Failure -> Failure -> Bool #

max :: Failure -> Failure -> Failure #

min :: Failure -> Failure -> Failure #

Ord Failure'FailureCode 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: Failure'FailureCode -> Failure'FailureCode -> Ordering #

(<) :: Failure'FailureCode -> Failure'FailureCode -> Bool #

(<=) :: Failure'FailureCode -> Failure'FailureCode -> Bool #

(>) :: Failure'FailureCode -> Failure'FailureCode -> Bool #

(>=) :: Failure'FailureCode -> Failure'FailureCode -> Bool #

max :: Failure'FailureCode -> Failure'FailureCode -> Failure'FailureCode #

min :: Failure'FailureCode -> Failure'FailureCode -> Failure'FailureCode #

Ord Failure'FailureCode'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: Failure'FailureCode'UnrecognizedValue -> Failure'FailureCode'UnrecognizedValue -> Ordering #

(<) :: Failure'FailureCode'UnrecognizedValue -> Failure'FailureCode'UnrecognizedValue -> Bool #

(<=) :: Failure'FailureCode'UnrecognizedValue -> Failure'FailureCode'UnrecognizedValue -> Bool #

(>) :: Failure'FailureCode'UnrecognizedValue -> Failure'FailureCode'UnrecognizedValue -> Bool #

(>=) :: Failure'FailureCode'UnrecognizedValue -> Failure'FailureCode'UnrecognizedValue -> Bool #

max :: Failure'FailureCode'UnrecognizedValue -> Failure'FailureCode'UnrecognizedValue -> Failure'FailureCode'UnrecognizedValue #

min :: Failure'FailureCode'UnrecognizedValue -> Failure'FailureCode'UnrecognizedValue -> Failure'FailureCode'UnrecognizedValue #

Ord FeeReportRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: FeeReportRequest -> FeeReportRequest -> Ordering #

(<) :: FeeReportRequest -> FeeReportRequest -> Bool #

(<=) :: FeeReportRequest -> FeeReportRequest -> Bool #

(>) :: FeeReportRequest -> FeeReportRequest -> Bool #

(>=) :: FeeReportRequest -> FeeReportRequest -> Bool #

max :: FeeReportRequest -> FeeReportRequest -> FeeReportRequest #

min :: FeeReportRequest -> FeeReportRequest -> FeeReportRequest #

Ord FeeReportResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: FeeReportResponse -> FeeReportResponse -> Ordering #

(<) :: FeeReportResponse -> FeeReportResponse -> Bool #

(<=) :: FeeReportResponse -> FeeReportResponse -> Bool #

(>) :: FeeReportResponse -> FeeReportResponse -> Bool #

(>=) :: FeeReportResponse -> FeeReportResponse -> Bool #

max :: FeeReportResponse -> FeeReportResponse -> FeeReportResponse #

min :: FeeReportResponse -> FeeReportResponse -> FeeReportResponse #

Ord ForwardingEvent 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: ForwardingEvent -> ForwardingEvent -> Ordering #

(<) :: ForwardingEvent -> ForwardingEvent -> Bool #

(<=) :: ForwardingEvent -> ForwardingEvent -> Bool #

(>) :: ForwardingEvent -> ForwardingEvent -> Bool #

(>=) :: ForwardingEvent -> ForwardingEvent -> Bool #

max :: ForwardingEvent -> ForwardingEvent -> ForwardingEvent #

min :: ForwardingEvent -> ForwardingEvent -> ForwardingEvent #

Ord ForwardingHistoryRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: ForwardingHistoryRequest -> ForwardingHistoryRequest -> Ordering #

(<) :: ForwardingHistoryRequest -> ForwardingHistoryRequest -> Bool #

(<=) :: ForwardingHistoryRequest -> ForwardingHistoryRequest -> Bool #

(>) :: ForwardingHistoryRequest -> ForwardingHistoryRequest -> Bool #

(>=) :: ForwardingHistoryRequest -> ForwardingHistoryRequest -> Bool #

max :: ForwardingHistoryRequest -> ForwardingHistoryRequest -> ForwardingHistoryRequest #

min :: ForwardingHistoryRequest -> ForwardingHistoryRequest -> ForwardingHistoryRequest #

Ord ForwardingHistoryResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: ForwardingHistoryResponse -> ForwardingHistoryResponse -> Ordering #

(<) :: ForwardingHistoryResponse -> ForwardingHistoryResponse -> Bool #

(<=) :: ForwardingHistoryResponse -> ForwardingHistoryResponse -> Bool #

(>) :: ForwardingHistoryResponse -> ForwardingHistoryResponse -> Bool #

(>=) :: ForwardingHistoryResponse -> ForwardingHistoryResponse -> Bool #

max :: ForwardingHistoryResponse -> ForwardingHistoryResponse -> ForwardingHistoryResponse #

min :: ForwardingHistoryResponse -> ForwardingHistoryResponse -> ForwardingHistoryResponse #

Ord HTLCAttempt 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: HTLCAttempt -> HTLCAttempt -> Ordering #

(<) :: HTLCAttempt -> HTLCAttempt -> Bool #

(<=) :: HTLCAttempt -> HTLCAttempt -> Bool #

(>) :: HTLCAttempt -> HTLCAttempt -> Bool #

(>=) :: HTLCAttempt -> HTLCAttempt -> Bool #

max :: HTLCAttempt -> HTLCAttempt -> HTLCAttempt #

min :: HTLCAttempt -> HTLCAttempt -> HTLCAttempt #

Ord HTLCAttempt'HTLCStatus 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: HTLCAttempt'HTLCStatus -> HTLCAttempt'HTLCStatus -> Ordering #

(<) :: HTLCAttempt'HTLCStatus -> HTLCAttempt'HTLCStatus -> Bool #

(<=) :: HTLCAttempt'HTLCStatus -> HTLCAttempt'HTLCStatus -> Bool #

(>) :: HTLCAttempt'HTLCStatus -> HTLCAttempt'HTLCStatus -> Bool #

(>=) :: HTLCAttempt'HTLCStatus -> HTLCAttempt'HTLCStatus -> Bool #

max :: HTLCAttempt'HTLCStatus -> HTLCAttempt'HTLCStatus -> HTLCAttempt'HTLCStatus #

min :: HTLCAttempt'HTLCStatus -> HTLCAttempt'HTLCStatus -> HTLCAttempt'HTLCStatus #

Ord HTLCAttempt'HTLCStatus'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: HTLCAttempt'HTLCStatus'UnrecognizedValue -> HTLCAttempt'HTLCStatus'UnrecognizedValue -> Ordering #

(<) :: HTLCAttempt'HTLCStatus'UnrecognizedValue -> HTLCAttempt'HTLCStatus'UnrecognizedValue -> Bool #

(<=) :: HTLCAttempt'HTLCStatus'UnrecognizedValue -> HTLCAttempt'HTLCStatus'UnrecognizedValue -> Bool #

(>) :: HTLCAttempt'HTLCStatus'UnrecognizedValue -> HTLCAttempt'HTLCStatus'UnrecognizedValue -> Bool #

(>=) :: HTLCAttempt'HTLCStatus'UnrecognizedValue -> HTLCAttempt'HTLCStatus'UnrecognizedValue -> Bool #

max :: HTLCAttempt'HTLCStatus'UnrecognizedValue -> HTLCAttempt'HTLCStatus'UnrecognizedValue -> HTLCAttempt'HTLCStatus'UnrecognizedValue #

min :: HTLCAttempt'HTLCStatus'UnrecognizedValue -> HTLCAttempt'HTLCStatus'UnrecognizedValue -> HTLCAttempt'HTLCStatus'UnrecognizedValue #

Ord InterceptFeedback 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: InterceptFeedback -> InterceptFeedback -> Ordering #

(<) :: InterceptFeedback -> InterceptFeedback -> Bool #

(<=) :: InterceptFeedback -> InterceptFeedback -> Bool #

(>) :: InterceptFeedback -> InterceptFeedback -> Bool #

(>=) :: InterceptFeedback -> InterceptFeedback -> Bool #

max :: InterceptFeedback -> InterceptFeedback -> InterceptFeedback #

min :: InterceptFeedback -> InterceptFeedback -> InterceptFeedback #

Ord Invoice 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: Invoice -> Invoice -> Ordering #

(<) :: Invoice -> Invoice -> Bool #

(<=) :: Invoice -> Invoice -> Bool #

(>) :: Invoice -> Invoice -> Bool #

(>=) :: Invoice -> Invoice -> Bool #

max :: Invoice -> Invoice -> Invoice #

min :: Invoice -> Invoice -> Invoice #

Ord Invoice'AmpInvoiceStateEntry 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: Invoice'AmpInvoiceStateEntry -> Invoice'AmpInvoiceStateEntry -> Ordering #

(<) :: Invoice'AmpInvoiceStateEntry -> Invoice'AmpInvoiceStateEntry -> Bool #

(<=) :: Invoice'AmpInvoiceStateEntry -> Invoice'AmpInvoiceStateEntry -> Bool #

(>) :: Invoice'AmpInvoiceStateEntry -> Invoice'AmpInvoiceStateEntry -> Bool #

(>=) :: Invoice'AmpInvoiceStateEntry -> Invoice'AmpInvoiceStateEntry -> Bool #

max :: Invoice'AmpInvoiceStateEntry -> Invoice'AmpInvoiceStateEntry -> Invoice'AmpInvoiceStateEntry #

min :: Invoice'AmpInvoiceStateEntry -> Invoice'AmpInvoiceStateEntry -> Invoice'AmpInvoiceStateEntry #

Ord Invoice'FeaturesEntry 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: Invoice'FeaturesEntry -> Invoice'FeaturesEntry -> Ordering #

(<) :: Invoice'FeaturesEntry -> Invoice'FeaturesEntry -> Bool #

(<=) :: Invoice'FeaturesEntry -> Invoice'FeaturesEntry -> Bool #

(>) :: Invoice'FeaturesEntry -> Invoice'FeaturesEntry -> Bool #

(>=) :: Invoice'FeaturesEntry -> Invoice'FeaturesEntry -> Bool #

max :: Invoice'FeaturesEntry -> Invoice'FeaturesEntry -> Invoice'FeaturesEntry #

min :: Invoice'FeaturesEntry -> Invoice'FeaturesEntry -> Invoice'FeaturesEntry #

Ord Invoice'InvoiceState 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: Invoice'InvoiceState -> Invoice'InvoiceState -> Ordering #

(<) :: Invoice'InvoiceState -> Invoice'InvoiceState -> Bool #

(<=) :: Invoice'InvoiceState -> Invoice'InvoiceState -> Bool #

(>) :: Invoice'InvoiceState -> Invoice'InvoiceState -> Bool #

(>=) :: Invoice'InvoiceState -> Invoice'InvoiceState -> Bool #

max :: Invoice'InvoiceState -> Invoice'InvoiceState -> Invoice'InvoiceState #

min :: Invoice'InvoiceState -> Invoice'InvoiceState -> Invoice'InvoiceState #

Ord Invoice'InvoiceState'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: Invoice'InvoiceState'UnrecognizedValue -> Invoice'InvoiceState'UnrecognizedValue -> Ordering #

(<) :: Invoice'InvoiceState'UnrecognizedValue -> Invoice'InvoiceState'UnrecognizedValue -> Bool #

(<=) :: Invoice'InvoiceState'UnrecognizedValue -> Invoice'InvoiceState'UnrecognizedValue -> Bool #

(>) :: Invoice'InvoiceState'UnrecognizedValue -> Invoice'InvoiceState'UnrecognizedValue -> Bool #

(>=) :: Invoice'InvoiceState'UnrecognizedValue -> Invoice'InvoiceState'UnrecognizedValue -> Bool #

max :: Invoice'InvoiceState'UnrecognizedValue -> Invoice'InvoiceState'UnrecognizedValue -> Invoice'InvoiceState'UnrecognizedValue #

min :: Invoice'InvoiceState'UnrecognizedValue -> Invoice'InvoiceState'UnrecognizedValue -> Invoice'InvoiceState'UnrecognizedValue #

Ord InvoiceHTLC 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: InvoiceHTLC -> InvoiceHTLC -> Ordering #

(<) :: InvoiceHTLC -> InvoiceHTLC -> Bool #

(<=) :: InvoiceHTLC -> InvoiceHTLC -> Bool #

(>) :: InvoiceHTLC -> InvoiceHTLC -> Bool #

(>=) :: InvoiceHTLC -> InvoiceHTLC -> Bool #

max :: InvoiceHTLC -> InvoiceHTLC -> InvoiceHTLC #

min :: InvoiceHTLC -> InvoiceHTLC -> InvoiceHTLC #

Ord InvoiceHTLC'CustomRecordsEntry 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: InvoiceHTLC'CustomRecordsEntry -> InvoiceHTLC'CustomRecordsEntry -> Ordering #

(<) :: InvoiceHTLC'CustomRecordsEntry -> InvoiceHTLC'CustomRecordsEntry -> Bool #

(<=) :: InvoiceHTLC'CustomRecordsEntry -> InvoiceHTLC'CustomRecordsEntry -> Bool #

(>) :: InvoiceHTLC'CustomRecordsEntry -> InvoiceHTLC'CustomRecordsEntry -> Bool #

(>=) :: InvoiceHTLC'CustomRecordsEntry -> InvoiceHTLC'CustomRecordsEntry -> Bool #

max :: InvoiceHTLC'CustomRecordsEntry -> InvoiceHTLC'CustomRecordsEntry -> InvoiceHTLC'CustomRecordsEntry #

min :: InvoiceHTLC'CustomRecordsEntry -> InvoiceHTLC'CustomRecordsEntry -> InvoiceHTLC'CustomRecordsEntry #

Ord InvoiceHTLCState 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: InvoiceHTLCState -> InvoiceHTLCState -> Ordering #

(<) :: InvoiceHTLCState -> InvoiceHTLCState -> Bool #

(<=) :: InvoiceHTLCState -> InvoiceHTLCState -> Bool #

(>) :: InvoiceHTLCState -> InvoiceHTLCState -> Bool #

(>=) :: InvoiceHTLCState -> InvoiceHTLCState -> Bool #

max :: InvoiceHTLCState -> InvoiceHTLCState -> InvoiceHTLCState #

min :: InvoiceHTLCState -> InvoiceHTLCState -> InvoiceHTLCState #

Ord InvoiceHTLCState'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: InvoiceHTLCState'UnrecognizedValue -> InvoiceHTLCState'UnrecognizedValue -> Ordering #

(<) :: InvoiceHTLCState'UnrecognizedValue -> InvoiceHTLCState'UnrecognizedValue -> Bool #

(<=) :: InvoiceHTLCState'UnrecognizedValue -> InvoiceHTLCState'UnrecognizedValue -> Bool #

(>) :: InvoiceHTLCState'UnrecognizedValue -> InvoiceHTLCState'UnrecognizedValue -> Bool #

(>=) :: InvoiceHTLCState'UnrecognizedValue -> InvoiceHTLCState'UnrecognizedValue -> Bool #

max :: InvoiceHTLCState'UnrecognizedValue -> InvoiceHTLCState'UnrecognizedValue -> InvoiceHTLCState'UnrecognizedValue #

min :: InvoiceHTLCState'UnrecognizedValue -> InvoiceHTLCState'UnrecognizedValue -> InvoiceHTLCState'UnrecognizedValue #

Ord InvoiceSubscription 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: InvoiceSubscription -> InvoiceSubscription -> Ordering #

(<) :: InvoiceSubscription -> InvoiceSubscription -> Bool #

(<=) :: InvoiceSubscription -> InvoiceSubscription -> Bool #

(>) :: InvoiceSubscription -> InvoiceSubscription -> Bool #

(>=) :: InvoiceSubscription -> InvoiceSubscription -> Bool #

max :: InvoiceSubscription -> InvoiceSubscription -> InvoiceSubscription #

min :: InvoiceSubscription -> InvoiceSubscription -> InvoiceSubscription #

Ord ListInvoiceRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: ListInvoiceRequest -> ListInvoiceRequest -> Ordering #

(<) :: ListInvoiceRequest -> ListInvoiceRequest -> Bool #

(<=) :: ListInvoiceRequest -> ListInvoiceRequest -> Bool #

(>) :: ListInvoiceRequest -> ListInvoiceRequest -> Bool #

(>=) :: ListInvoiceRequest -> ListInvoiceRequest -> Bool #

max :: ListInvoiceRequest -> ListInvoiceRequest -> ListInvoiceRequest #

min :: ListInvoiceRequest -> ListInvoiceRequest -> ListInvoiceRequest #

Ord ListInvoiceResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: ListInvoiceResponse -> ListInvoiceResponse -> Ordering #

(<) :: ListInvoiceResponse -> ListInvoiceResponse -> Bool #

(<=) :: ListInvoiceResponse -> ListInvoiceResponse -> Bool #

(>) :: ListInvoiceResponse -> ListInvoiceResponse -> Bool #

(>=) :: ListInvoiceResponse -> ListInvoiceResponse -> Bool #

max :: ListInvoiceResponse -> ListInvoiceResponse -> ListInvoiceResponse #

min :: ListInvoiceResponse -> ListInvoiceResponse -> ListInvoiceResponse #

Ord ListMacaroonIDsRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: ListMacaroonIDsRequest -> ListMacaroonIDsRequest -> Ordering #

(<) :: ListMacaroonIDsRequest -> ListMacaroonIDsRequest -> Bool #

(<=) :: ListMacaroonIDsRequest -> ListMacaroonIDsRequest -> Bool #

(>) :: ListMacaroonIDsRequest -> ListMacaroonIDsRequest -> Bool #

(>=) :: ListMacaroonIDsRequest -> ListMacaroonIDsRequest -> Bool #

max :: ListMacaroonIDsRequest -> ListMacaroonIDsRequest -> ListMacaroonIDsRequest #

min :: ListMacaroonIDsRequest -> ListMacaroonIDsRequest -> ListMacaroonIDsRequest #

Ord ListMacaroonIDsResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: ListMacaroonIDsResponse -> ListMacaroonIDsResponse -> Ordering #

(<) :: ListMacaroonIDsResponse -> ListMacaroonIDsResponse -> Bool #

(<=) :: ListMacaroonIDsResponse -> ListMacaroonIDsResponse -> Bool #

(>) :: ListMacaroonIDsResponse -> ListMacaroonIDsResponse -> Bool #

(>=) :: ListMacaroonIDsResponse -> ListMacaroonIDsResponse -> Bool #

max :: ListMacaroonIDsResponse -> ListMacaroonIDsResponse -> ListMacaroonIDsResponse #

min :: ListMacaroonIDsResponse -> ListMacaroonIDsResponse -> ListMacaroonIDsResponse #

Ord ListPaymentsRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: ListPaymentsRequest -> ListPaymentsRequest -> Ordering #

(<) :: ListPaymentsRequest -> ListPaymentsRequest -> Bool #

(<=) :: ListPaymentsRequest -> ListPaymentsRequest -> Bool #

(>) :: ListPaymentsRequest -> ListPaymentsRequest -> Bool #

(>=) :: ListPaymentsRequest -> ListPaymentsRequest -> Bool #

max :: ListPaymentsRequest -> ListPaymentsRequest -> ListPaymentsRequest #

min :: ListPaymentsRequest -> ListPaymentsRequest -> ListPaymentsRequest #

Ord ListPaymentsResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: ListPaymentsResponse -> ListPaymentsResponse -> Ordering #

(<) :: ListPaymentsResponse -> ListPaymentsResponse -> Bool #

(<=) :: ListPaymentsResponse -> ListPaymentsResponse -> Bool #

(>) :: ListPaymentsResponse -> ListPaymentsResponse -> Bool #

(>=) :: ListPaymentsResponse -> ListPaymentsResponse -> Bool #

max :: ListPaymentsResponse -> ListPaymentsResponse -> ListPaymentsResponse #

min :: ListPaymentsResponse -> ListPaymentsResponse -> ListPaymentsResponse #

Ord ListPermissionsRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: ListPermissionsRequest -> ListPermissionsRequest -> Ordering #

(<) :: ListPermissionsRequest -> ListPermissionsRequest -> Bool #

(<=) :: ListPermissionsRequest -> ListPermissionsRequest -> Bool #

(>) :: ListPermissionsRequest -> ListPermissionsRequest -> Bool #

(>=) :: ListPermissionsRequest -> ListPermissionsRequest -> Bool #

max :: ListPermissionsRequest -> ListPermissionsRequest -> ListPermissionsRequest #

min :: ListPermissionsRequest -> ListPermissionsRequest -> ListPermissionsRequest #

Ord ListPermissionsResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: ListPermissionsResponse -> ListPermissionsResponse -> Ordering #

(<) :: ListPermissionsResponse -> ListPermissionsResponse -> Bool #

(<=) :: ListPermissionsResponse -> ListPermissionsResponse -> Bool #

(>) :: ListPermissionsResponse -> ListPermissionsResponse -> Bool #

(>=) :: ListPermissionsResponse -> ListPermissionsResponse -> Bool #

max :: ListPermissionsResponse -> ListPermissionsResponse -> ListPermissionsResponse #

min :: ListPermissionsResponse -> ListPermissionsResponse -> ListPermissionsResponse #

Ord ListPermissionsResponse'MethodPermissionsEntry 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: ListPermissionsResponse'MethodPermissionsEntry -> ListPermissionsResponse'MethodPermissionsEntry -> Ordering #

(<) :: ListPermissionsResponse'MethodPermissionsEntry -> ListPermissionsResponse'MethodPermissionsEntry -> Bool #

(<=) :: ListPermissionsResponse'MethodPermissionsEntry -> ListPermissionsResponse'MethodPermissionsEntry -> Bool #

(>) :: ListPermissionsResponse'MethodPermissionsEntry -> ListPermissionsResponse'MethodPermissionsEntry -> Bool #

(>=) :: ListPermissionsResponse'MethodPermissionsEntry -> ListPermissionsResponse'MethodPermissionsEntry -> Bool #

max :: ListPermissionsResponse'MethodPermissionsEntry -> ListPermissionsResponse'MethodPermissionsEntry -> ListPermissionsResponse'MethodPermissionsEntry #

min :: ListPermissionsResponse'MethodPermissionsEntry -> ListPermissionsResponse'MethodPermissionsEntry -> ListPermissionsResponse'MethodPermissionsEntry #

Ord MacaroonId 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: MacaroonId -> MacaroonId -> Ordering #

(<) :: MacaroonId -> MacaroonId -> Bool #

(<=) :: MacaroonId -> MacaroonId -> Bool #

(>) :: MacaroonId -> MacaroonId -> Bool #

(>=) :: MacaroonId -> MacaroonId -> Bool #

max :: MacaroonId -> MacaroonId -> MacaroonId #

min :: MacaroonId -> MacaroonId -> MacaroonId #

Ord MacaroonPermission 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: MacaroonPermission -> MacaroonPermission -> Ordering #

(<) :: MacaroonPermission -> MacaroonPermission -> Bool #

(<=) :: MacaroonPermission -> MacaroonPermission -> Bool #

(>) :: MacaroonPermission -> MacaroonPermission -> Bool #

(>=) :: MacaroonPermission -> MacaroonPermission -> Bool #

max :: MacaroonPermission -> MacaroonPermission -> MacaroonPermission #

min :: MacaroonPermission -> MacaroonPermission -> MacaroonPermission #

Ord MacaroonPermissionList 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: MacaroonPermissionList -> MacaroonPermissionList -> Ordering #

(<) :: MacaroonPermissionList -> MacaroonPermissionList -> Bool #

(<=) :: MacaroonPermissionList -> MacaroonPermissionList -> Bool #

(>) :: MacaroonPermissionList -> MacaroonPermissionList -> Bool #

(>=) :: MacaroonPermissionList -> MacaroonPermissionList -> Bool #

max :: MacaroonPermissionList -> MacaroonPermissionList -> MacaroonPermissionList #

min :: MacaroonPermissionList -> MacaroonPermissionList -> MacaroonPermissionList #

Ord MiddlewareRegistration 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: MiddlewareRegistration -> MiddlewareRegistration -> Ordering #

(<) :: MiddlewareRegistration -> MiddlewareRegistration -> Bool #

(<=) :: MiddlewareRegistration -> MiddlewareRegistration -> Bool #

(>) :: MiddlewareRegistration -> MiddlewareRegistration -> Bool #

(>=) :: MiddlewareRegistration -> MiddlewareRegistration -> Bool #

max :: MiddlewareRegistration -> MiddlewareRegistration -> MiddlewareRegistration #

min :: MiddlewareRegistration -> MiddlewareRegistration -> MiddlewareRegistration #

Ord MultiChanBackup 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: MultiChanBackup -> MultiChanBackup -> Ordering #

(<) :: MultiChanBackup -> MultiChanBackup -> Bool #

(<=) :: MultiChanBackup -> MultiChanBackup -> Bool #

(>) :: MultiChanBackup -> MultiChanBackup -> Bool #

(>=) :: MultiChanBackup -> MultiChanBackup -> Bool #

max :: MultiChanBackup -> MultiChanBackup -> MultiChanBackup #

min :: MultiChanBackup -> MultiChanBackup -> MultiChanBackup #

Ord Op 
Instance details

Defined in Proto.Lnrpc.Ln1

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 PayReq 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: PayReq -> PayReq -> Ordering #

(<) :: PayReq -> PayReq -> Bool #

(<=) :: PayReq -> PayReq -> Bool #

(>) :: PayReq -> PayReq -> Bool #

(>=) :: PayReq -> PayReq -> Bool #

max :: PayReq -> PayReq -> PayReq #

min :: PayReq -> PayReq -> PayReq #

Ord PayReq'FeaturesEntry 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: PayReq'FeaturesEntry -> PayReq'FeaturesEntry -> Ordering #

(<) :: PayReq'FeaturesEntry -> PayReq'FeaturesEntry -> Bool #

(<=) :: PayReq'FeaturesEntry -> PayReq'FeaturesEntry -> Bool #

(>) :: PayReq'FeaturesEntry -> PayReq'FeaturesEntry -> Bool #

(>=) :: PayReq'FeaturesEntry -> PayReq'FeaturesEntry -> Bool #

max :: PayReq'FeaturesEntry -> PayReq'FeaturesEntry -> PayReq'FeaturesEntry #

min :: PayReq'FeaturesEntry -> PayReq'FeaturesEntry -> PayReq'FeaturesEntry #

Ord PayReqString 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: PayReqString -> PayReqString -> Ordering #

(<) :: PayReqString -> PayReqString -> Bool #

(<=) :: PayReqString -> PayReqString -> Bool #

(>) :: PayReqString -> PayReqString -> Bool #

(>=) :: PayReqString -> PayReqString -> Bool #

max :: PayReqString -> PayReqString -> PayReqString #

min :: PayReqString -> PayReqString -> PayReqString #

Ord Payment 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: Payment -> Payment -> Ordering #

(<) :: Payment -> Payment -> Bool #

(<=) :: Payment -> Payment -> Bool #

(>) :: Payment -> Payment -> Bool #

(>=) :: Payment -> Payment -> Bool #

max :: Payment -> Payment -> Payment #

min :: Payment -> Payment -> Payment #

Ord Payment'PaymentStatus 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: Payment'PaymentStatus -> Payment'PaymentStatus -> Ordering #

(<) :: Payment'PaymentStatus -> Payment'PaymentStatus -> Bool #

(<=) :: Payment'PaymentStatus -> Payment'PaymentStatus -> Bool #

(>) :: Payment'PaymentStatus -> Payment'PaymentStatus -> Bool #

(>=) :: Payment'PaymentStatus -> Payment'PaymentStatus -> Bool #

max :: Payment'PaymentStatus -> Payment'PaymentStatus -> Payment'PaymentStatus #

min :: Payment'PaymentStatus -> Payment'PaymentStatus -> Payment'PaymentStatus #

Ord Payment'PaymentStatus'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: Payment'PaymentStatus'UnrecognizedValue -> Payment'PaymentStatus'UnrecognizedValue -> Ordering #

(<) :: Payment'PaymentStatus'UnrecognizedValue -> Payment'PaymentStatus'UnrecognizedValue -> Bool #

(<=) :: Payment'PaymentStatus'UnrecognizedValue -> Payment'PaymentStatus'UnrecognizedValue -> Bool #

(>) :: Payment'PaymentStatus'UnrecognizedValue -> Payment'PaymentStatus'UnrecognizedValue -> Bool #

(>=) :: Payment'PaymentStatus'UnrecognizedValue -> Payment'PaymentStatus'UnrecognizedValue -> Bool #

max :: Payment'PaymentStatus'UnrecognizedValue -> Payment'PaymentStatus'UnrecognizedValue -> Payment'PaymentStatus'UnrecognizedValue #

min :: Payment'PaymentStatus'UnrecognizedValue -> Payment'PaymentStatus'UnrecognizedValue -> Payment'PaymentStatus'UnrecognizedValue #

Ord PaymentFailureReason 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: PaymentFailureReason -> PaymentFailureReason -> Ordering #

(<) :: PaymentFailureReason -> PaymentFailureReason -> Bool #

(<=) :: PaymentFailureReason -> PaymentFailureReason -> Bool #

(>) :: PaymentFailureReason -> PaymentFailureReason -> Bool #

(>=) :: PaymentFailureReason -> PaymentFailureReason -> Bool #

max :: PaymentFailureReason -> PaymentFailureReason -> PaymentFailureReason #

min :: PaymentFailureReason -> PaymentFailureReason -> PaymentFailureReason #

Ord PaymentFailureReason'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: PaymentFailureReason'UnrecognizedValue -> PaymentFailureReason'UnrecognizedValue -> Ordering #

(<) :: PaymentFailureReason'UnrecognizedValue -> PaymentFailureReason'UnrecognizedValue -> Bool #

(<=) :: PaymentFailureReason'UnrecognizedValue -> PaymentFailureReason'UnrecognizedValue -> Bool #

(>) :: PaymentFailureReason'UnrecognizedValue -> PaymentFailureReason'UnrecognizedValue -> Bool #

(>=) :: PaymentFailureReason'UnrecognizedValue -> PaymentFailureReason'UnrecognizedValue -> Bool #

max :: PaymentFailureReason'UnrecognizedValue -> PaymentFailureReason'UnrecognizedValue -> PaymentFailureReason'UnrecognizedValue #

min :: PaymentFailureReason'UnrecognizedValue -> PaymentFailureReason'UnrecognizedValue -> PaymentFailureReason'UnrecognizedValue #

Ord PaymentHash 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: PaymentHash -> PaymentHash -> Ordering #

(<) :: PaymentHash -> PaymentHash -> Bool #

(<=) :: PaymentHash -> PaymentHash -> Bool #

(>) :: PaymentHash -> PaymentHash -> Bool #

(>=) :: PaymentHash -> PaymentHash -> Bool #

max :: PaymentHash -> PaymentHash -> PaymentHash #

min :: PaymentHash -> PaymentHash -> PaymentHash #

Ord PolicyUpdateRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: PolicyUpdateRequest -> PolicyUpdateRequest -> Ordering #

(<) :: PolicyUpdateRequest -> PolicyUpdateRequest -> Bool #

(<=) :: PolicyUpdateRequest -> PolicyUpdateRequest -> Bool #

(>) :: PolicyUpdateRequest -> PolicyUpdateRequest -> Bool #

(>=) :: PolicyUpdateRequest -> PolicyUpdateRequest -> Bool #

max :: PolicyUpdateRequest -> PolicyUpdateRequest -> PolicyUpdateRequest #

min :: PolicyUpdateRequest -> PolicyUpdateRequest -> PolicyUpdateRequest #

Ord PolicyUpdateRequest'Scope 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: PolicyUpdateRequest'Scope -> PolicyUpdateRequest'Scope -> Ordering #

(<) :: PolicyUpdateRequest'Scope -> PolicyUpdateRequest'Scope -> Bool #

(<=) :: PolicyUpdateRequest'Scope -> PolicyUpdateRequest'Scope -> Bool #

(>) :: PolicyUpdateRequest'Scope -> PolicyUpdateRequest'Scope -> Bool #

(>=) :: PolicyUpdateRequest'Scope -> PolicyUpdateRequest'Scope -> Bool #

max :: PolicyUpdateRequest'Scope -> PolicyUpdateRequest'Scope -> PolicyUpdateRequest'Scope #

min :: PolicyUpdateRequest'Scope -> PolicyUpdateRequest'Scope -> PolicyUpdateRequest'Scope #

Ord PolicyUpdateResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: PolicyUpdateResponse -> PolicyUpdateResponse -> Ordering #

(<) :: PolicyUpdateResponse -> PolicyUpdateResponse -> Bool #

(<=) :: PolicyUpdateResponse -> PolicyUpdateResponse -> Bool #

(>) :: PolicyUpdateResponse -> PolicyUpdateResponse -> Bool #

(>=) :: PolicyUpdateResponse -> PolicyUpdateResponse -> Bool #

max :: PolicyUpdateResponse -> PolicyUpdateResponse -> PolicyUpdateResponse #

min :: PolicyUpdateResponse -> PolicyUpdateResponse -> PolicyUpdateResponse #

Ord RPCMessage 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: RPCMessage -> RPCMessage -> Ordering #

(<) :: RPCMessage -> RPCMessage -> Bool #

(<=) :: RPCMessage -> RPCMessage -> Bool #

(>) :: RPCMessage -> RPCMessage -> Bool #

(>=) :: RPCMessage -> RPCMessage -> Bool #

max :: RPCMessage -> RPCMessage -> RPCMessage #

min :: RPCMessage -> RPCMessage -> RPCMessage #

Ord RPCMiddlewareRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: RPCMiddlewareRequest -> RPCMiddlewareRequest -> Ordering #

(<) :: RPCMiddlewareRequest -> RPCMiddlewareRequest -> Bool #

(<=) :: RPCMiddlewareRequest -> RPCMiddlewareRequest -> Bool #

(>) :: RPCMiddlewareRequest -> RPCMiddlewareRequest -> Bool #

(>=) :: RPCMiddlewareRequest -> RPCMiddlewareRequest -> Bool #

max :: RPCMiddlewareRequest -> RPCMiddlewareRequest -> RPCMiddlewareRequest #

min :: RPCMiddlewareRequest -> RPCMiddlewareRequest -> RPCMiddlewareRequest #

Ord RPCMiddlewareRequest'InterceptType 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: RPCMiddlewareRequest'InterceptType -> RPCMiddlewareRequest'InterceptType -> Ordering #

(<) :: RPCMiddlewareRequest'InterceptType -> RPCMiddlewareRequest'InterceptType -> Bool #

(<=) :: RPCMiddlewareRequest'InterceptType -> RPCMiddlewareRequest'InterceptType -> Bool #

(>) :: RPCMiddlewareRequest'InterceptType -> RPCMiddlewareRequest'InterceptType -> Bool #

(>=) :: RPCMiddlewareRequest'InterceptType -> RPCMiddlewareRequest'InterceptType -> Bool #

max :: RPCMiddlewareRequest'InterceptType -> RPCMiddlewareRequest'InterceptType -> RPCMiddlewareRequest'InterceptType #

min :: RPCMiddlewareRequest'InterceptType -> RPCMiddlewareRequest'InterceptType -> RPCMiddlewareRequest'InterceptType #

Ord RPCMiddlewareResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: RPCMiddlewareResponse -> RPCMiddlewareResponse -> Ordering #

(<) :: RPCMiddlewareResponse -> RPCMiddlewareResponse -> Bool #

(<=) :: RPCMiddlewareResponse -> RPCMiddlewareResponse -> Bool #

(>) :: RPCMiddlewareResponse -> RPCMiddlewareResponse -> Bool #

(>=) :: RPCMiddlewareResponse -> RPCMiddlewareResponse -> Bool #

max :: RPCMiddlewareResponse -> RPCMiddlewareResponse -> RPCMiddlewareResponse #

min :: RPCMiddlewareResponse -> RPCMiddlewareResponse -> RPCMiddlewareResponse #

Ord RPCMiddlewareResponse'MiddlewareMessage 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: RPCMiddlewareResponse'MiddlewareMessage -> RPCMiddlewareResponse'MiddlewareMessage -> Ordering #

(<) :: RPCMiddlewareResponse'MiddlewareMessage -> RPCMiddlewareResponse'MiddlewareMessage -> Bool #

(<=) :: RPCMiddlewareResponse'MiddlewareMessage -> RPCMiddlewareResponse'MiddlewareMessage -> Bool #

(>) :: RPCMiddlewareResponse'MiddlewareMessage -> RPCMiddlewareResponse'MiddlewareMessage -> Bool #

(>=) :: RPCMiddlewareResponse'MiddlewareMessage -> RPCMiddlewareResponse'MiddlewareMessage -> Bool #

max :: RPCMiddlewareResponse'MiddlewareMessage -> RPCMiddlewareResponse'MiddlewareMessage -> RPCMiddlewareResponse'MiddlewareMessage #

min :: RPCMiddlewareResponse'MiddlewareMessage -> RPCMiddlewareResponse'MiddlewareMessage -> RPCMiddlewareResponse'MiddlewareMessage #

Ord RestoreBackupResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: RestoreBackupResponse -> RestoreBackupResponse -> Ordering #

(<) :: RestoreBackupResponse -> RestoreBackupResponse -> Bool #

(<=) :: RestoreBackupResponse -> RestoreBackupResponse -> Bool #

(>) :: RestoreBackupResponse -> RestoreBackupResponse -> Bool #

(>=) :: RestoreBackupResponse -> RestoreBackupResponse -> Bool #

max :: RestoreBackupResponse -> RestoreBackupResponse -> RestoreBackupResponse #

min :: RestoreBackupResponse -> RestoreBackupResponse -> RestoreBackupResponse #

Ord RestoreChanBackupRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: RestoreChanBackupRequest -> RestoreChanBackupRequest -> Ordering #

(<) :: RestoreChanBackupRequest -> RestoreChanBackupRequest -> Bool #

(<=) :: RestoreChanBackupRequest -> RestoreChanBackupRequest -> Bool #

(>) :: RestoreChanBackupRequest -> RestoreChanBackupRequest -> Bool #

(>=) :: RestoreChanBackupRequest -> RestoreChanBackupRequest -> Bool #

max :: RestoreChanBackupRequest -> RestoreChanBackupRequest -> RestoreChanBackupRequest #

min :: RestoreChanBackupRequest -> RestoreChanBackupRequest -> RestoreChanBackupRequest #

Ord RestoreChanBackupRequest'Backup 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: RestoreChanBackupRequest'Backup -> RestoreChanBackupRequest'Backup -> Ordering #

(<) :: RestoreChanBackupRequest'Backup -> RestoreChanBackupRequest'Backup -> Bool #

(<=) :: RestoreChanBackupRequest'Backup -> RestoreChanBackupRequest'Backup -> Bool #

(>) :: RestoreChanBackupRequest'Backup -> RestoreChanBackupRequest'Backup -> Bool #

(>=) :: RestoreChanBackupRequest'Backup -> RestoreChanBackupRequest'Backup -> Bool #

max :: RestoreChanBackupRequest'Backup -> RestoreChanBackupRequest'Backup -> RestoreChanBackupRequest'Backup #

min :: RestoreChanBackupRequest'Backup -> RestoreChanBackupRequest'Backup -> RestoreChanBackupRequest'Backup #

Ord SetID 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: SetID -> SetID -> Ordering #

(<) :: SetID -> SetID -> Bool #

(<=) :: SetID -> SetID -> Bool #

(>) :: SetID -> SetID -> Bool #

(>=) :: SetID -> SetID -> Bool #

max :: SetID -> SetID -> SetID #

min :: SetID -> SetID -> SetID #

Ord StreamAuth 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: StreamAuth -> StreamAuth -> Ordering #

(<) :: StreamAuth -> StreamAuth -> Bool #

(<=) :: StreamAuth -> StreamAuth -> Bool #

(>) :: StreamAuth -> StreamAuth -> Bool #

(>=) :: StreamAuth -> StreamAuth -> Bool #

max :: StreamAuth -> StreamAuth -> StreamAuth #

min :: StreamAuth -> StreamAuth -> StreamAuth #

Ord UpdateFailure 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: UpdateFailure -> UpdateFailure -> Ordering #

(<) :: UpdateFailure -> UpdateFailure -> Bool #

(<=) :: UpdateFailure -> UpdateFailure -> Bool #

(>) :: UpdateFailure -> UpdateFailure -> Bool #

(>=) :: UpdateFailure -> UpdateFailure -> Bool #

max :: UpdateFailure -> UpdateFailure -> UpdateFailure #

min :: UpdateFailure -> UpdateFailure -> UpdateFailure #

Ord UpdateFailure'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: UpdateFailure'UnrecognizedValue -> UpdateFailure'UnrecognizedValue -> Ordering #

(<) :: UpdateFailure'UnrecognizedValue -> UpdateFailure'UnrecognizedValue -> Bool #

(<=) :: UpdateFailure'UnrecognizedValue -> UpdateFailure'UnrecognizedValue -> Bool #

(>) :: UpdateFailure'UnrecognizedValue -> UpdateFailure'UnrecognizedValue -> Bool #

(>=) :: UpdateFailure'UnrecognizedValue -> UpdateFailure'UnrecognizedValue -> Bool #

max :: UpdateFailure'UnrecognizedValue -> UpdateFailure'UnrecognizedValue -> UpdateFailure'UnrecognizedValue #

min :: UpdateFailure'UnrecognizedValue -> UpdateFailure'UnrecognizedValue -> UpdateFailure'UnrecognizedValue #

Ord VerifyChanBackupResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

compare :: VerifyChanBackupResponse -> VerifyChanBackupResponse -> Ordering #

(<) :: VerifyChanBackupResponse -> VerifyChanBackupResponse -> Bool #

(<=) :: VerifyChanBackupResponse -> VerifyChanBackupResponse -> Bool #

(>) :: VerifyChanBackupResponse -> VerifyChanBackupResponse -> Bool #

(>=) :: VerifyChanBackupResponse -> VerifyChanBackupResponse -> Bool #

max :: VerifyChanBackupResponse -> VerifyChanBackupResponse -> VerifyChanBackupResponse #

min :: VerifyChanBackupResponse -> VerifyChanBackupResponse -> VerifyChanBackupResponse #

Ord BuildRouteRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: BuildRouteRequest -> BuildRouteRequest -> Ordering #

(<) :: BuildRouteRequest -> BuildRouteRequest -> Bool #

(<=) :: BuildRouteRequest -> BuildRouteRequest -> Bool #

(>) :: BuildRouteRequest -> BuildRouteRequest -> Bool #

(>=) :: BuildRouteRequest -> BuildRouteRequest -> Bool #

max :: BuildRouteRequest -> BuildRouteRequest -> BuildRouteRequest #

min :: BuildRouteRequest -> BuildRouteRequest -> BuildRouteRequest #

Ord BuildRouteResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: BuildRouteResponse -> BuildRouteResponse -> Ordering #

(<) :: BuildRouteResponse -> BuildRouteResponse -> Bool #

(<=) :: BuildRouteResponse -> BuildRouteResponse -> Bool #

(>) :: BuildRouteResponse -> BuildRouteResponse -> Bool #

(>=) :: BuildRouteResponse -> BuildRouteResponse -> Bool #

max :: BuildRouteResponse -> BuildRouteResponse -> BuildRouteResponse #

min :: BuildRouteResponse -> BuildRouteResponse -> BuildRouteResponse #

Ord ChanStatusAction 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: ChanStatusAction -> ChanStatusAction -> Ordering #

(<) :: ChanStatusAction -> ChanStatusAction -> Bool #

(<=) :: ChanStatusAction -> ChanStatusAction -> Bool #

(>) :: ChanStatusAction -> ChanStatusAction -> Bool #

(>=) :: ChanStatusAction -> ChanStatusAction -> Bool #

max :: ChanStatusAction -> ChanStatusAction -> ChanStatusAction #

min :: ChanStatusAction -> ChanStatusAction -> ChanStatusAction #

Ord ChanStatusAction'UnrecognizedValue 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: ChanStatusAction'UnrecognizedValue -> ChanStatusAction'UnrecognizedValue -> Ordering #

(<) :: ChanStatusAction'UnrecognizedValue -> ChanStatusAction'UnrecognizedValue -> Bool #

(<=) :: ChanStatusAction'UnrecognizedValue -> ChanStatusAction'UnrecognizedValue -> Bool #

(>) :: ChanStatusAction'UnrecognizedValue -> ChanStatusAction'UnrecognizedValue -> Bool #

(>=) :: ChanStatusAction'UnrecognizedValue -> ChanStatusAction'UnrecognizedValue -> Bool #

max :: ChanStatusAction'UnrecognizedValue -> ChanStatusAction'UnrecognizedValue -> ChanStatusAction'UnrecognizedValue #

min :: ChanStatusAction'UnrecognizedValue -> ChanStatusAction'UnrecognizedValue -> ChanStatusAction'UnrecognizedValue #

Ord CircuitKey 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: CircuitKey -> CircuitKey -> Ordering #

(<) :: CircuitKey -> CircuitKey -> Bool #

(<=) :: CircuitKey -> CircuitKey -> Bool #

(>) :: CircuitKey -> CircuitKey -> Bool #

(>=) :: CircuitKey -> CircuitKey -> Bool #

max :: CircuitKey -> CircuitKey -> CircuitKey #

min :: CircuitKey -> CircuitKey -> CircuitKey #

Ord FailureDetail 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: FailureDetail -> FailureDetail -> Ordering #

(<) :: FailureDetail -> FailureDetail -> Bool #

(<=) :: FailureDetail -> FailureDetail -> Bool #

(>) :: FailureDetail -> FailureDetail -> Bool #

(>=) :: FailureDetail -> FailureDetail -> Bool #

max :: FailureDetail -> FailureDetail -> FailureDetail #

min :: FailureDetail -> FailureDetail -> FailureDetail #

Ord FailureDetail'UnrecognizedValue 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: FailureDetail'UnrecognizedValue -> FailureDetail'UnrecognizedValue -> Ordering #

(<) :: FailureDetail'UnrecognizedValue -> FailureDetail'UnrecognizedValue -> Bool #

(<=) :: FailureDetail'UnrecognizedValue -> FailureDetail'UnrecognizedValue -> Bool #

(>) :: FailureDetail'UnrecognizedValue -> FailureDetail'UnrecognizedValue -> Bool #

(>=) :: FailureDetail'UnrecognizedValue -> FailureDetail'UnrecognizedValue -> Bool #

max :: FailureDetail'UnrecognizedValue -> FailureDetail'UnrecognizedValue -> FailureDetail'UnrecognizedValue #

min :: FailureDetail'UnrecognizedValue -> FailureDetail'UnrecognizedValue -> FailureDetail'UnrecognizedValue #

Ord ForwardEvent 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: ForwardEvent -> ForwardEvent -> Ordering #

(<) :: ForwardEvent -> ForwardEvent -> Bool #

(<=) :: ForwardEvent -> ForwardEvent -> Bool #

(>) :: ForwardEvent -> ForwardEvent -> Bool #

(>=) :: ForwardEvent -> ForwardEvent -> Bool #

max :: ForwardEvent -> ForwardEvent -> ForwardEvent #

min :: ForwardEvent -> ForwardEvent -> ForwardEvent #

Ord ForwardFailEvent 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: ForwardFailEvent -> ForwardFailEvent -> Ordering #

(<) :: ForwardFailEvent -> ForwardFailEvent -> Bool #

(<=) :: ForwardFailEvent -> ForwardFailEvent -> Bool #

(>) :: ForwardFailEvent -> ForwardFailEvent -> Bool #

(>=) :: ForwardFailEvent -> ForwardFailEvent -> Bool #

max :: ForwardFailEvent -> ForwardFailEvent -> ForwardFailEvent #

min :: ForwardFailEvent -> ForwardFailEvent -> ForwardFailEvent #

Ord ForwardHtlcInterceptRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: ForwardHtlcInterceptRequest -> ForwardHtlcInterceptRequest -> Ordering #

(<) :: ForwardHtlcInterceptRequest -> ForwardHtlcInterceptRequest -> Bool #

(<=) :: ForwardHtlcInterceptRequest -> ForwardHtlcInterceptRequest -> Bool #

(>) :: ForwardHtlcInterceptRequest -> ForwardHtlcInterceptRequest -> Bool #

(>=) :: ForwardHtlcInterceptRequest -> ForwardHtlcInterceptRequest -> Bool #

max :: ForwardHtlcInterceptRequest -> ForwardHtlcInterceptRequest -> ForwardHtlcInterceptRequest #

min :: ForwardHtlcInterceptRequest -> ForwardHtlcInterceptRequest -> ForwardHtlcInterceptRequest #

Ord ForwardHtlcInterceptRequest'CustomRecordsEntry 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: ForwardHtlcInterceptRequest'CustomRecordsEntry -> ForwardHtlcInterceptRequest'CustomRecordsEntry -> Ordering #

(<) :: ForwardHtlcInterceptRequest'CustomRecordsEntry -> ForwardHtlcInterceptRequest'CustomRecordsEntry -> Bool #

(<=) :: ForwardHtlcInterceptRequest'CustomRecordsEntry -> ForwardHtlcInterceptRequest'CustomRecordsEntry -> Bool #

(>) :: ForwardHtlcInterceptRequest'CustomRecordsEntry -> ForwardHtlcInterceptRequest'CustomRecordsEntry -> Bool #

(>=) :: ForwardHtlcInterceptRequest'CustomRecordsEntry -> ForwardHtlcInterceptRequest'CustomRecordsEntry -> Bool #

max :: ForwardHtlcInterceptRequest'CustomRecordsEntry -> ForwardHtlcInterceptRequest'CustomRecordsEntry -> ForwardHtlcInterceptRequest'CustomRecordsEntry #

min :: ForwardHtlcInterceptRequest'CustomRecordsEntry -> ForwardHtlcInterceptRequest'CustomRecordsEntry -> ForwardHtlcInterceptRequest'CustomRecordsEntry #

Ord ForwardHtlcInterceptResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: ForwardHtlcInterceptResponse -> ForwardHtlcInterceptResponse -> Ordering #

(<) :: ForwardHtlcInterceptResponse -> ForwardHtlcInterceptResponse -> Bool #

(<=) :: ForwardHtlcInterceptResponse -> ForwardHtlcInterceptResponse -> Bool #

(>) :: ForwardHtlcInterceptResponse -> ForwardHtlcInterceptResponse -> Bool #

(>=) :: ForwardHtlcInterceptResponse -> ForwardHtlcInterceptResponse -> Bool #

max :: ForwardHtlcInterceptResponse -> ForwardHtlcInterceptResponse -> ForwardHtlcInterceptResponse #

min :: ForwardHtlcInterceptResponse -> ForwardHtlcInterceptResponse -> ForwardHtlcInterceptResponse #

Ord GetMissionControlConfigRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: GetMissionControlConfigRequest -> GetMissionControlConfigRequest -> Ordering #

(<) :: GetMissionControlConfigRequest -> GetMissionControlConfigRequest -> Bool #

(<=) :: GetMissionControlConfigRequest -> GetMissionControlConfigRequest -> Bool #

(>) :: GetMissionControlConfigRequest -> GetMissionControlConfigRequest -> Bool #

(>=) :: GetMissionControlConfigRequest -> GetMissionControlConfigRequest -> Bool #

max :: GetMissionControlConfigRequest -> GetMissionControlConfigRequest -> GetMissionControlConfigRequest #

min :: GetMissionControlConfigRequest -> GetMissionControlConfigRequest -> GetMissionControlConfigRequest #

Ord GetMissionControlConfigResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: GetMissionControlConfigResponse -> GetMissionControlConfigResponse -> Ordering #

(<) :: GetMissionControlConfigResponse -> GetMissionControlConfigResponse -> Bool #

(<=) :: GetMissionControlConfigResponse -> GetMissionControlConfigResponse -> Bool #

(>) :: GetMissionControlConfigResponse -> GetMissionControlConfigResponse -> Bool #

(>=) :: GetMissionControlConfigResponse -> GetMissionControlConfigResponse -> Bool #

max :: GetMissionControlConfigResponse -> GetMissionControlConfigResponse -> GetMissionControlConfigResponse #

min :: GetMissionControlConfigResponse -> GetMissionControlConfigResponse -> GetMissionControlConfigResponse #

Ord HtlcEvent 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: HtlcEvent -> HtlcEvent -> Ordering #

(<) :: HtlcEvent -> HtlcEvent -> Bool #

(<=) :: HtlcEvent -> HtlcEvent -> Bool #

(>) :: HtlcEvent -> HtlcEvent -> Bool #

(>=) :: HtlcEvent -> HtlcEvent -> Bool #

max :: HtlcEvent -> HtlcEvent -> HtlcEvent #

min :: HtlcEvent -> HtlcEvent -> HtlcEvent #

Ord HtlcEvent'Event 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: HtlcEvent'Event -> HtlcEvent'Event -> Ordering #

(<) :: HtlcEvent'Event -> HtlcEvent'Event -> Bool #

(<=) :: HtlcEvent'Event -> HtlcEvent'Event -> Bool #

(>) :: HtlcEvent'Event -> HtlcEvent'Event -> Bool #

(>=) :: HtlcEvent'Event -> HtlcEvent'Event -> Bool #

max :: HtlcEvent'Event -> HtlcEvent'Event -> HtlcEvent'Event #

min :: HtlcEvent'Event -> HtlcEvent'Event -> HtlcEvent'Event #

Ord HtlcEvent'EventType 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: HtlcEvent'EventType -> HtlcEvent'EventType -> Ordering #

(<) :: HtlcEvent'EventType -> HtlcEvent'EventType -> Bool #

(<=) :: HtlcEvent'EventType -> HtlcEvent'EventType -> Bool #

(>) :: HtlcEvent'EventType -> HtlcEvent'EventType -> Bool #

(>=) :: HtlcEvent'EventType -> HtlcEvent'EventType -> Bool #

max :: HtlcEvent'EventType -> HtlcEvent'EventType -> HtlcEvent'EventType #

min :: HtlcEvent'EventType -> HtlcEvent'EventType -> HtlcEvent'EventType #

Ord HtlcEvent'EventType'UnrecognizedValue 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: HtlcEvent'EventType'UnrecognizedValue -> HtlcEvent'EventType'UnrecognizedValue -> Ordering #

(<) :: HtlcEvent'EventType'UnrecognizedValue -> HtlcEvent'EventType'UnrecognizedValue -> Bool #

(<=) :: HtlcEvent'EventType'UnrecognizedValue -> HtlcEvent'EventType'UnrecognizedValue -> Bool #

(>) :: HtlcEvent'EventType'UnrecognizedValue -> HtlcEvent'EventType'UnrecognizedValue -> Bool #

(>=) :: HtlcEvent'EventType'UnrecognizedValue -> HtlcEvent'EventType'UnrecognizedValue -> Bool #

max :: HtlcEvent'EventType'UnrecognizedValue -> HtlcEvent'EventType'UnrecognizedValue -> HtlcEvent'EventType'UnrecognizedValue #

min :: HtlcEvent'EventType'UnrecognizedValue -> HtlcEvent'EventType'UnrecognizedValue -> HtlcEvent'EventType'UnrecognizedValue #

Ord HtlcInfo 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: HtlcInfo -> HtlcInfo -> Ordering #

(<) :: HtlcInfo -> HtlcInfo -> Bool #

(<=) :: HtlcInfo -> HtlcInfo -> Bool #

(>) :: HtlcInfo -> HtlcInfo -> Bool #

(>=) :: HtlcInfo -> HtlcInfo -> Bool #

max :: HtlcInfo -> HtlcInfo -> HtlcInfo #

min :: HtlcInfo -> HtlcInfo -> HtlcInfo #

Ord LinkFailEvent 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: LinkFailEvent -> LinkFailEvent -> Ordering #

(<) :: LinkFailEvent -> LinkFailEvent -> Bool #

(<=) :: LinkFailEvent -> LinkFailEvent -> Bool #

(>) :: LinkFailEvent -> LinkFailEvent -> Bool #

(>=) :: LinkFailEvent -> LinkFailEvent -> Bool #

max :: LinkFailEvent -> LinkFailEvent -> LinkFailEvent #

min :: LinkFailEvent -> LinkFailEvent -> LinkFailEvent #

Ord MissionControlConfig 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: MissionControlConfig -> MissionControlConfig -> Ordering #

(<) :: MissionControlConfig -> MissionControlConfig -> Bool #

(<=) :: MissionControlConfig -> MissionControlConfig -> Bool #

(>) :: MissionControlConfig -> MissionControlConfig -> Bool #

(>=) :: MissionControlConfig -> MissionControlConfig -> Bool #

max :: MissionControlConfig -> MissionControlConfig -> MissionControlConfig #

min :: MissionControlConfig -> MissionControlConfig -> MissionControlConfig #

Ord PairData 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: PairData -> PairData -> Ordering #

(<) :: PairData -> PairData -> Bool #

(<=) :: PairData -> PairData -> Bool #

(>) :: PairData -> PairData -> Bool #

(>=) :: PairData -> PairData -> Bool #

max :: PairData -> PairData -> PairData #

min :: PairData -> PairData -> PairData #

Ord PairHistory 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: PairHistory -> PairHistory -> Ordering #

(<) :: PairHistory -> PairHistory -> Bool #

(<=) :: PairHistory -> PairHistory -> Bool #

(>) :: PairHistory -> PairHistory -> Bool #

(>=) :: PairHistory -> PairHistory -> Bool #

max :: PairHistory -> PairHistory -> PairHistory #

min :: PairHistory -> PairHistory -> PairHistory #

Ord PaymentState 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: PaymentState -> PaymentState -> Ordering #

(<) :: PaymentState -> PaymentState -> Bool #

(<=) :: PaymentState -> PaymentState -> Bool #

(>) :: PaymentState -> PaymentState -> Bool #

(>=) :: PaymentState -> PaymentState -> Bool #

max :: PaymentState -> PaymentState -> PaymentState #

min :: PaymentState -> PaymentState -> PaymentState #

Ord PaymentState'UnrecognizedValue 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: PaymentState'UnrecognizedValue -> PaymentState'UnrecognizedValue -> Ordering #

(<) :: PaymentState'UnrecognizedValue -> PaymentState'UnrecognizedValue -> Bool #

(<=) :: PaymentState'UnrecognizedValue -> PaymentState'UnrecognizedValue -> Bool #

(>) :: PaymentState'UnrecognizedValue -> PaymentState'UnrecognizedValue -> Bool #

(>=) :: PaymentState'UnrecognizedValue -> PaymentState'UnrecognizedValue -> Bool #

max :: PaymentState'UnrecognizedValue -> PaymentState'UnrecognizedValue -> PaymentState'UnrecognizedValue #

min :: PaymentState'UnrecognizedValue -> PaymentState'UnrecognizedValue -> PaymentState'UnrecognizedValue #

Ord PaymentStatus 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: PaymentStatus -> PaymentStatus -> Ordering #

(<) :: PaymentStatus -> PaymentStatus -> Bool #

(<=) :: PaymentStatus -> PaymentStatus -> Bool #

(>) :: PaymentStatus -> PaymentStatus -> Bool #

(>=) :: PaymentStatus -> PaymentStatus -> Bool #

max :: PaymentStatus -> PaymentStatus -> PaymentStatus #

min :: PaymentStatus -> PaymentStatus -> PaymentStatus #

Ord QueryMissionControlRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: QueryMissionControlRequest -> QueryMissionControlRequest -> Ordering #

(<) :: QueryMissionControlRequest -> QueryMissionControlRequest -> Bool #

(<=) :: QueryMissionControlRequest -> QueryMissionControlRequest -> Bool #

(>) :: QueryMissionControlRequest -> QueryMissionControlRequest -> Bool #

(>=) :: QueryMissionControlRequest -> QueryMissionControlRequest -> Bool #

max :: QueryMissionControlRequest -> QueryMissionControlRequest -> QueryMissionControlRequest #

min :: QueryMissionControlRequest -> QueryMissionControlRequest -> QueryMissionControlRequest #

Ord QueryMissionControlResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: QueryMissionControlResponse -> QueryMissionControlResponse -> Ordering #

(<) :: QueryMissionControlResponse -> QueryMissionControlResponse -> Bool #

(<=) :: QueryMissionControlResponse -> QueryMissionControlResponse -> Bool #

(>) :: QueryMissionControlResponse -> QueryMissionControlResponse -> Bool #

(>=) :: QueryMissionControlResponse -> QueryMissionControlResponse -> Bool #

max :: QueryMissionControlResponse -> QueryMissionControlResponse -> QueryMissionControlResponse #

min :: QueryMissionControlResponse -> QueryMissionControlResponse -> QueryMissionControlResponse #

Ord QueryProbabilityRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: QueryProbabilityRequest -> QueryProbabilityRequest -> Ordering #

(<) :: QueryProbabilityRequest -> QueryProbabilityRequest -> Bool #

(<=) :: QueryProbabilityRequest -> QueryProbabilityRequest -> Bool #

(>) :: QueryProbabilityRequest -> QueryProbabilityRequest -> Bool #

(>=) :: QueryProbabilityRequest -> QueryProbabilityRequest -> Bool #

max :: QueryProbabilityRequest -> QueryProbabilityRequest -> QueryProbabilityRequest #

min :: QueryProbabilityRequest -> QueryProbabilityRequest -> QueryProbabilityRequest #

Ord QueryProbabilityResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: QueryProbabilityResponse -> QueryProbabilityResponse -> Ordering #

(<) :: QueryProbabilityResponse -> QueryProbabilityResponse -> Bool #

(<=) :: QueryProbabilityResponse -> QueryProbabilityResponse -> Bool #

(>) :: QueryProbabilityResponse -> QueryProbabilityResponse -> Bool #

(>=) :: QueryProbabilityResponse -> QueryProbabilityResponse -> Bool #

max :: QueryProbabilityResponse -> QueryProbabilityResponse -> QueryProbabilityResponse #

min :: QueryProbabilityResponse -> QueryProbabilityResponse -> QueryProbabilityResponse #

Ord ResetMissionControlRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: ResetMissionControlRequest -> ResetMissionControlRequest -> Ordering #

(<) :: ResetMissionControlRequest -> ResetMissionControlRequest -> Bool #

(<=) :: ResetMissionControlRequest -> ResetMissionControlRequest -> Bool #

(>) :: ResetMissionControlRequest -> ResetMissionControlRequest -> Bool #

(>=) :: ResetMissionControlRequest -> ResetMissionControlRequest -> Bool #

max :: ResetMissionControlRequest -> ResetMissionControlRequest -> ResetMissionControlRequest #

min :: ResetMissionControlRequest -> ResetMissionControlRequest -> ResetMissionControlRequest #

Ord ResetMissionControlResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: ResetMissionControlResponse -> ResetMissionControlResponse -> Ordering #

(<) :: ResetMissionControlResponse -> ResetMissionControlResponse -> Bool #

(<=) :: ResetMissionControlResponse -> ResetMissionControlResponse -> Bool #

(>) :: ResetMissionControlResponse -> ResetMissionControlResponse -> Bool #

(>=) :: ResetMissionControlResponse -> ResetMissionControlResponse -> Bool #

max :: ResetMissionControlResponse -> ResetMissionControlResponse -> ResetMissionControlResponse #

min :: ResetMissionControlResponse -> ResetMissionControlResponse -> ResetMissionControlResponse #

Ord ResolveHoldForwardAction 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: ResolveHoldForwardAction -> ResolveHoldForwardAction -> Ordering #

(<) :: ResolveHoldForwardAction -> ResolveHoldForwardAction -> Bool #

(<=) :: ResolveHoldForwardAction -> ResolveHoldForwardAction -> Bool #

(>) :: ResolveHoldForwardAction -> ResolveHoldForwardAction -> Bool #

(>=) :: ResolveHoldForwardAction -> ResolveHoldForwardAction -> Bool #

max :: ResolveHoldForwardAction -> ResolveHoldForwardAction -> ResolveHoldForwardAction #

min :: ResolveHoldForwardAction -> ResolveHoldForwardAction -> ResolveHoldForwardAction #

Ord ResolveHoldForwardAction'UnrecognizedValue 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: ResolveHoldForwardAction'UnrecognizedValue -> ResolveHoldForwardAction'UnrecognizedValue -> Ordering #

(<) :: ResolveHoldForwardAction'UnrecognizedValue -> ResolveHoldForwardAction'UnrecognizedValue -> Bool #

(<=) :: ResolveHoldForwardAction'UnrecognizedValue -> ResolveHoldForwardAction'UnrecognizedValue -> Bool #

(>) :: ResolveHoldForwardAction'UnrecognizedValue -> ResolveHoldForwardAction'UnrecognizedValue -> Bool #

(>=) :: ResolveHoldForwardAction'UnrecognizedValue -> ResolveHoldForwardAction'UnrecognizedValue -> Bool #

max :: ResolveHoldForwardAction'UnrecognizedValue -> ResolveHoldForwardAction'UnrecognizedValue -> ResolveHoldForwardAction'UnrecognizedValue #

min :: ResolveHoldForwardAction'UnrecognizedValue -> ResolveHoldForwardAction'UnrecognizedValue -> ResolveHoldForwardAction'UnrecognizedValue #

Ord RouteFeeRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: RouteFeeRequest -> RouteFeeRequest -> Ordering #

(<) :: RouteFeeRequest -> RouteFeeRequest -> Bool #

(<=) :: RouteFeeRequest -> RouteFeeRequest -> Bool #

(>) :: RouteFeeRequest -> RouteFeeRequest -> Bool #

(>=) :: RouteFeeRequest -> RouteFeeRequest -> Bool #

max :: RouteFeeRequest -> RouteFeeRequest -> RouteFeeRequest #

min :: RouteFeeRequest -> RouteFeeRequest -> RouteFeeRequest #

Ord RouteFeeResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: RouteFeeResponse -> RouteFeeResponse -> Ordering #

(<) :: RouteFeeResponse -> RouteFeeResponse -> Bool #

(<=) :: RouteFeeResponse -> RouteFeeResponse -> Bool #

(>) :: RouteFeeResponse -> RouteFeeResponse -> Bool #

(>=) :: RouteFeeResponse -> RouteFeeResponse -> Bool #

max :: RouteFeeResponse -> RouteFeeResponse -> RouteFeeResponse #

min :: RouteFeeResponse -> RouteFeeResponse -> RouteFeeResponse #

Ord SendPaymentRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: SendPaymentRequest -> SendPaymentRequest -> Ordering #

(<) :: SendPaymentRequest -> SendPaymentRequest -> Bool #

(<=) :: SendPaymentRequest -> SendPaymentRequest -> Bool #

(>) :: SendPaymentRequest -> SendPaymentRequest -> Bool #

(>=) :: SendPaymentRequest -> SendPaymentRequest -> Bool #

max :: SendPaymentRequest -> SendPaymentRequest -> SendPaymentRequest #

min :: SendPaymentRequest -> SendPaymentRequest -> SendPaymentRequest #

Ord SendPaymentRequest'DestCustomRecordsEntry 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: SendPaymentRequest'DestCustomRecordsEntry -> SendPaymentRequest'DestCustomRecordsEntry -> Ordering #

(<) :: SendPaymentRequest'DestCustomRecordsEntry -> SendPaymentRequest'DestCustomRecordsEntry -> Bool #

(<=) :: SendPaymentRequest'DestCustomRecordsEntry -> SendPaymentRequest'DestCustomRecordsEntry -> Bool #

(>) :: SendPaymentRequest'DestCustomRecordsEntry -> SendPaymentRequest'DestCustomRecordsEntry -> Bool #

(>=) :: SendPaymentRequest'DestCustomRecordsEntry -> SendPaymentRequest'DestCustomRecordsEntry -> Bool #

max :: SendPaymentRequest'DestCustomRecordsEntry -> SendPaymentRequest'DestCustomRecordsEntry -> SendPaymentRequest'DestCustomRecordsEntry #

min :: SendPaymentRequest'DestCustomRecordsEntry -> SendPaymentRequest'DestCustomRecordsEntry -> SendPaymentRequest'DestCustomRecordsEntry #

Ord SendToRouteRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: SendToRouteRequest -> SendToRouteRequest -> Ordering #

(<) :: SendToRouteRequest -> SendToRouteRequest -> Bool #

(<=) :: SendToRouteRequest -> SendToRouteRequest -> Bool #

(>) :: SendToRouteRequest -> SendToRouteRequest -> Bool #

(>=) :: SendToRouteRequest -> SendToRouteRequest -> Bool #

max :: SendToRouteRequest -> SendToRouteRequest -> SendToRouteRequest #

min :: SendToRouteRequest -> SendToRouteRequest -> SendToRouteRequest #

Ord SendToRouteResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: SendToRouteResponse -> SendToRouteResponse -> Ordering #

(<) :: SendToRouteResponse -> SendToRouteResponse -> Bool #

(<=) :: SendToRouteResponse -> SendToRouteResponse -> Bool #

(>) :: SendToRouteResponse -> SendToRouteResponse -> Bool #

(>=) :: SendToRouteResponse -> SendToRouteResponse -> Bool #

max :: SendToRouteResponse -> SendToRouteResponse -> SendToRouteResponse #

min :: SendToRouteResponse -> SendToRouteResponse -> SendToRouteResponse #

Ord SetMissionControlConfigRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: SetMissionControlConfigRequest -> SetMissionControlConfigRequest -> Ordering #

(<) :: SetMissionControlConfigRequest -> SetMissionControlConfigRequest -> Bool #

(<=) :: SetMissionControlConfigRequest -> SetMissionControlConfigRequest -> Bool #

(>) :: SetMissionControlConfigRequest -> SetMissionControlConfigRequest -> Bool #

(>=) :: SetMissionControlConfigRequest -> SetMissionControlConfigRequest -> Bool #

max :: SetMissionControlConfigRequest -> SetMissionControlConfigRequest -> SetMissionControlConfigRequest #

min :: SetMissionControlConfigRequest -> SetMissionControlConfigRequest -> SetMissionControlConfigRequest #

Ord SetMissionControlConfigResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: SetMissionControlConfigResponse -> SetMissionControlConfigResponse -> Ordering #

(<) :: SetMissionControlConfigResponse -> SetMissionControlConfigResponse -> Bool #

(<=) :: SetMissionControlConfigResponse -> SetMissionControlConfigResponse -> Bool #

(>) :: SetMissionControlConfigResponse -> SetMissionControlConfigResponse -> Bool #

(>=) :: SetMissionControlConfigResponse -> SetMissionControlConfigResponse -> Bool #

max :: SetMissionControlConfigResponse -> SetMissionControlConfigResponse -> SetMissionControlConfigResponse #

min :: SetMissionControlConfigResponse -> SetMissionControlConfigResponse -> SetMissionControlConfigResponse #

Ord SettleEvent 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: SettleEvent -> SettleEvent -> Ordering #

(<) :: SettleEvent -> SettleEvent -> Bool #

(<=) :: SettleEvent -> SettleEvent -> Bool #

(>) :: SettleEvent -> SettleEvent -> Bool #

(>=) :: SettleEvent -> SettleEvent -> Bool #

max :: SettleEvent -> SettleEvent -> SettleEvent #

min :: SettleEvent -> SettleEvent -> SettleEvent #

Ord SubscribeHtlcEventsRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: SubscribeHtlcEventsRequest -> SubscribeHtlcEventsRequest -> Ordering #

(<) :: SubscribeHtlcEventsRequest -> SubscribeHtlcEventsRequest -> Bool #

(<=) :: SubscribeHtlcEventsRequest -> SubscribeHtlcEventsRequest -> Bool #

(>) :: SubscribeHtlcEventsRequest -> SubscribeHtlcEventsRequest -> Bool #

(>=) :: SubscribeHtlcEventsRequest -> SubscribeHtlcEventsRequest -> Bool #

max :: SubscribeHtlcEventsRequest -> SubscribeHtlcEventsRequest -> SubscribeHtlcEventsRequest #

min :: SubscribeHtlcEventsRequest -> SubscribeHtlcEventsRequest -> SubscribeHtlcEventsRequest #

Ord TrackPaymentRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: TrackPaymentRequest -> TrackPaymentRequest -> Ordering #

(<) :: TrackPaymentRequest -> TrackPaymentRequest -> Bool #

(<=) :: TrackPaymentRequest -> TrackPaymentRequest -> Bool #

(>) :: TrackPaymentRequest -> TrackPaymentRequest -> Bool #

(>=) :: TrackPaymentRequest -> TrackPaymentRequest -> Bool #

max :: TrackPaymentRequest -> TrackPaymentRequest -> TrackPaymentRequest #

min :: TrackPaymentRequest -> TrackPaymentRequest -> TrackPaymentRequest #

Ord UpdateChanStatusRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: UpdateChanStatusRequest -> UpdateChanStatusRequest -> Ordering #

(<) :: UpdateChanStatusRequest -> UpdateChanStatusRequest -> Bool #

(<=) :: UpdateChanStatusRequest -> UpdateChanStatusRequest -> Bool #

(>) :: UpdateChanStatusRequest -> UpdateChanStatusRequest -> Bool #

(>=) :: UpdateChanStatusRequest -> UpdateChanStatusRequest -> Bool #

max :: UpdateChanStatusRequest -> UpdateChanStatusRequest -> UpdateChanStatusRequest #

min :: UpdateChanStatusRequest -> UpdateChanStatusRequest -> UpdateChanStatusRequest #

Ord UpdateChanStatusResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: UpdateChanStatusResponse -> UpdateChanStatusResponse -> Ordering #

(<) :: UpdateChanStatusResponse -> UpdateChanStatusResponse -> Bool #

(<=) :: UpdateChanStatusResponse -> UpdateChanStatusResponse -> Bool #

(>) :: UpdateChanStatusResponse -> UpdateChanStatusResponse -> Bool #

(>=) :: UpdateChanStatusResponse -> UpdateChanStatusResponse -> Bool #

max :: UpdateChanStatusResponse -> UpdateChanStatusResponse -> UpdateChanStatusResponse #

min :: UpdateChanStatusResponse -> UpdateChanStatusResponse -> UpdateChanStatusResponse #

Ord XImportMissionControlRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: XImportMissionControlRequest -> XImportMissionControlRequest -> Ordering #

(<) :: XImportMissionControlRequest -> XImportMissionControlRequest -> Bool #

(<=) :: XImportMissionControlRequest -> XImportMissionControlRequest -> Bool #

(>) :: XImportMissionControlRequest -> XImportMissionControlRequest -> Bool #

(>=) :: XImportMissionControlRequest -> XImportMissionControlRequest -> Bool #

max :: XImportMissionControlRequest -> XImportMissionControlRequest -> XImportMissionControlRequest #

min :: XImportMissionControlRequest -> XImportMissionControlRequest -> XImportMissionControlRequest #

Ord XImportMissionControlResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

compare :: XImportMissionControlResponse -> XImportMissionControlResponse -> Ordering #

(<) :: XImportMissionControlResponse -> XImportMissionControlResponse -> Bool #

(<=) :: XImportMissionControlResponse -> XImportMissionControlResponse -> Bool #

(>) :: XImportMissionControlResponse -> XImportMissionControlResponse -> Bool #

(>=) :: XImportMissionControlResponse -> XImportMissionControlResponse -> Bool #

max :: XImportMissionControlResponse -> XImportMissionControlResponse -> XImportMissionControlResponse #

min :: XImportMissionControlResponse -> XImportMissionControlResponse -> XImportMissionControlResponse #

Ord InputScript 
Instance details

Defined in Proto.Signrpc.Signer

Methods

compare :: InputScript -> InputScript -> Ordering #

(<) :: InputScript -> InputScript -> Bool #

(<=) :: InputScript -> InputScript -> Bool #

(>) :: InputScript -> InputScript -> Bool #

(>=) :: InputScript -> InputScript -> Bool #

max :: InputScript -> InputScript -> InputScript #

min :: InputScript -> InputScript -> InputScript #

Ord InputScriptResp 
Instance details

Defined in Proto.Signrpc.Signer

Methods

compare :: InputScriptResp -> InputScriptResp -> Ordering #

(<) :: InputScriptResp -> InputScriptResp -> Bool #

(<=) :: InputScriptResp -> InputScriptResp -> Bool #

(>) :: InputScriptResp -> InputScriptResp -> Bool #

(>=) :: InputScriptResp -> InputScriptResp -> Bool #

max :: InputScriptResp -> InputScriptResp -> InputScriptResp #

min :: InputScriptResp -> InputScriptResp -> InputScriptResp #

Ord KeyDescriptor 
Instance details

Defined in Proto.Signrpc.Signer

Methods

compare :: KeyDescriptor -> KeyDescriptor -> Ordering #

(<) :: KeyDescriptor -> KeyDescriptor -> Bool #

(<=) :: KeyDescriptor -> KeyDescriptor -> Bool #

(>) :: KeyDescriptor -> KeyDescriptor -> Bool #

(>=) :: KeyDescriptor -> KeyDescriptor -> Bool #

max :: KeyDescriptor -> KeyDescriptor -> KeyDescriptor #

min :: KeyDescriptor -> KeyDescriptor -> KeyDescriptor #

Ord KeyLocator 
Instance details

Defined in Proto.Signrpc.Signer

Methods

compare :: KeyLocator -> KeyLocator -> Ordering #

(<) :: KeyLocator -> KeyLocator -> Bool #

(<=) :: KeyLocator -> KeyLocator -> Bool #

(>) :: KeyLocator -> KeyLocator -> Bool #

(>=) :: KeyLocator -> KeyLocator -> Bool #

max :: KeyLocator -> KeyLocator -> KeyLocator #

min :: KeyLocator -> KeyLocator -> KeyLocator #

Ord SharedKeyRequest 
Instance details

Defined in Proto.Signrpc.Signer

Methods

compare :: SharedKeyRequest -> SharedKeyRequest -> Ordering #

(<) :: SharedKeyRequest -> SharedKeyRequest -> Bool #

(<=) :: SharedKeyRequest -> SharedKeyRequest -> Bool #

(>) :: SharedKeyRequest -> SharedKeyRequest -> Bool #

(>=) :: SharedKeyRequest -> SharedKeyRequest -> Bool #

max :: SharedKeyRequest -> SharedKeyRequest -> SharedKeyRequest #

min :: SharedKeyRequest -> SharedKeyRequest -> SharedKeyRequest #

Ord SharedKeyResponse 
Instance details

Defined in Proto.Signrpc.Signer

Methods

compare :: SharedKeyResponse -> SharedKeyResponse -> Ordering #

(<) :: SharedKeyResponse -> SharedKeyResponse -> Bool #

(<=) :: SharedKeyResponse -> SharedKeyResponse -> Bool #

(>) :: SharedKeyResponse -> SharedKeyResponse -> Bool #

(>=) :: SharedKeyResponse -> SharedKeyResponse -> Bool #

max :: SharedKeyResponse -> SharedKeyResponse -> SharedKeyResponse #

min :: SharedKeyResponse -> SharedKeyResponse -> SharedKeyResponse #

Ord SignDescriptor 
Instance details

Defined in Proto.Signrpc.Signer

Methods

compare :: SignDescriptor -> SignDescriptor -> Ordering #

(<) :: SignDescriptor -> SignDescriptor -> Bool #

(<=) :: SignDescriptor -> SignDescriptor -> Bool #

(>) :: SignDescriptor -> SignDescriptor -> Bool #

(>=) :: SignDescriptor -> SignDescriptor -> Bool #

max :: SignDescriptor -> SignDescriptor -> SignDescriptor #

min :: SignDescriptor -> SignDescriptor -> SignDescriptor #

Ord SignMessageReq 
Instance details

Defined in Proto.Signrpc.Signer

Methods

compare :: SignMessageReq -> SignMessageReq -> Ordering #

(<) :: SignMessageReq -> SignMessageReq -> Bool #

(<=) :: SignMessageReq -> SignMessageReq -> Bool #

(>) :: SignMessageReq -> SignMessageReq -> Bool #

(>=) :: SignMessageReq -> SignMessageReq -> Bool #

max :: SignMessageReq -> SignMessageReq -> SignMessageReq #

min :: SignMessageReq -> SignMessageReq -> SignMessageReq #

Ord SignMessageResp 
Instance details

Defined in Proto.Signrpc.Signer

Methods

compare :: SignMessageResp -> SignMessageResp -> Ordering #

(<) :: SignMessageResp -> SignMessageResp -> Bool #

(<=) :: SignMessageResp -> SignMessageResp -> Bool #

(>) :: SignMessageResp -> SignMessageResp -> Bool #

(>=) :: SignMessageResp -> SignMessageResp -> Bool #

max :: SignMessageResp -> SignMessageResp -> SignMessageResp #

min :: SignMessageResp -> SignMessageResp -> SignMessageResp #

Ord SignReq 
Instance details

Defined in Proto.Signrpc.Signer

Methods

compare :: SignReq -> SignReq -> Ordering #

(<) :: SignReq -> SignReq -> Bool #

(<=) :: SignReq -> SignReq -> Bool #

(>) :: SignReq -> SignReq -> Bool #

(>=) :: SignReq -> SignReq -> Bool #

max :: SignReq -> SignReq -> SignReq #

min :: SignReq -> SignReq -> SignReq #

Ord SignResp 
Instance details

Defined in Proto.Signrpc.Signer

Methods

compare :: SignResp -> SignResp -> Ordering #

(<) :: SignResp -> SignResp -> Bool #

(<=) :: SignResp -> SignResp -> Bool #

(>) :: SignResp -> SignResp -> Bool #

(>=) :: SignResp -> SignResp -> Bool #

max :: SignResp -> SignResp -> SignResp #

min :: SignResp -> SignResp -> SignResp #

Ord TxOut 
Instance details

Defined in Proto.Signrpc.Signer

Methods

compare :: TxOut -> TxOut -> Ordering #

(<) :: TxOut -> TxOut -> Bool #

(<=) :: TxOut -> TxOut -> Bool #

(>) :: TxOut -> TxOut -> Bool #

(>=) :: TxOut -> TxOut -> Bool #

max :: TxOut -> TxOut -> TxOut #

min :: TxOut -> TxOut -> TxOut #

Ord VerifyMessageReq 
Instance details

Defined in Proto.Signrpc.Signer

Methods

compare :: VerifyMessageReq -> VerifyMessageReq -> Ordering #

(<) :: VerifyMessageReq -> VerifyMessageReq -> Bool #

(<=) :: VerifyMessageReq -> VerifyMessageReq -> Bool #

(>) :: VerifyMessageReq -> VerifyMessageReq -> Bool #

(>=) :: VerifyMessageReq -> VerifyMessageReq -> Bool #

max :: VerifyMessageReq -> VerifyMessageReq -> VerifyMessageReq #

min :: VerifyMessageReq -> VerifyMessageReq -> VerifyMessageReq #

Ord VerifyMessageResp 
Instance details

Defined in Proto.Signrpc.Signer

Methods

compare :: VerifyMessageResp -> VerifyMessageResp -> Ordering #

(<) :: VerifyMessageResp -> VerifyMessageResp -> Bool #

(<=) :: VerifyMessageResp -> VerifyMessageResp -> Bool #

(>) :: VerifyMessageResp -> VerifyMessageResp -> Bool #

(>=) :: VerifyMessageResp -> VerifyMessageResp -> Bool #

max :: VerifyMessageResp -> VerifyMessageResp -> VerifyMessageResp #

min :: VerifyMessageResp -> VerifyMessageResp -> VerifyMessageResp #

Ord Account 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: Account -> Account -> Ordering #

(<) :: Account -> Account -> Bool #

(<=) :: Account -> Account -> Bool #

(>) :: Account -> Account -> Bool #

(>=) :: Account -> Account -> Bool #

max :: Account -> Account -> Account #

min :: Account -> Account -> Account #

Ord AddrRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: AddrRequest -> AddrRequest -> Ordering #

(<) :: AddrRequest -> AddrRequest -> Bool #

(<=) :: AddrRequest -> AddrRequest -> Bool #

(>) :: AddrRequest -> AddrRequest -> Bool #

(>=) :: AddrRequest -> AddrRequest -> Bool #

max :: AddrRequest -> AddrRequest -> AddrRequest #

min :: AddrRequest -> AddrRequest -> AddrRequest #

Ord AddrResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: AddrResponse -> AddrResponse -> Ordering #

(<) :: AddrResponse -> AddrResponse -> Bool #

(<=) :: AddrResponse -> AddrResponse -> Bool #

(>) :: AddrResponse -> AddrResponse -> Bool #

(>=) :: AddrResponse -> AddrResponse -> Bool #

max :: AddrResponse -> AddrResponse -> AddrResponse #

min :: AddrResponse -> AddrResponse -> AddrResponse #

Ord AddressType 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: AddressType -> AddressType -> Ordering #

(<) :: AddressType -> AddressType -> Bool #

(<=) :: AddressType -> AddressType -> Bool #

(>) :: AddressType -> AddressType -> Bool #

(>=) :: AddressType -> AddressType -> Bool #

max :: AddressType -> AddressType -> AddressType #

min :: AddressType -> AddressType -> AddressType #

Ord AddressType'UnrecognizedValue 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: AddressType'UnrecognizedValue -> AddressType'UnrecognizedValue -> Ordering #

(<) :: AddressType'UnrecognizedValue -> AddressType'UnrecognizedValue -> Bool #

(<=) :: AddressType'UnrecognizedValue -> AddressType'UnrecognizedValue -> Bool #

(>) :: AddressType'UnrecognizedValue -> AddressType'UnrecognizedValue -> Bool #

(>=) :: AddressType'UnrecognizedValue -> AddressType'UnrecognizedValue -> Bool #

max :: AddressType'UnrecognizedValue -> AddressType'UnrecognizedValue -> AddressType'UnrecognizedValue #

min :: AddressType'UnrecognizedValue -> AddressType'UnrecognizedValue -> AddressType'UnrecognizedValue #

Ord BumpFeeRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: BumpFeeRequest -> BumpFeeRequest -> Ordering #

(<) :: BumpFeeRequest -> BumpFeeRequest -> Bool #

(<=) :: BumpFeeRequest -> BumpFeeRequest -> Bool #

(>) :: BumpFeeRequest -> BumpFeeRequest -> Bool #

(>=) :: BumpFeeRequest -> BumpFeeRequest -> Bool #

max :: BumpFeeRequest -> BumpFeeRequest -> BumpFeeRequest #

min :: BumpFeeRequest -> BumpFeeRequest -> BumpFeeRequest #

Ord BumpFeeResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: BumpFeeResponse -> BumpFeeResponse -> Ordering #

(<) :: BumpFeeResponse -> BumpFeeResponse -> Bool #

(<=) :: BumpFeeResponse -> BumpFeeResponse -> Bool #

(>) :: BumpFeeResponse -> BumpFeeResponse -> Bool #

(>=) :: BumpFeeResponse -> BumpFeeResponse -> Bool #

max :: BumpFeeResponse -> BumpFeeResponse -> BumpFeeResponse #

min :: BumpFeeResponse -> BumpFeeResponse -> BumpFeeResponse #

Ord EstimateFeeRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: EstimateFeeRequest -> EstimateFeeRequest -> Ordering #

(<) :: EstimateFeeRequest -> EstimateFeeRequest -> Bool #

(<=) :: EstimateFeeRequest -> EstimateFeeRequest -> Bool #

(>) :: EstimateFeeRequest -> EstimateFeeRequest -> Bool #

(>=) :: EstimateFeeRequest -> EstimateFeeRequest -> Bool #

max :: EstimateFeeRequest -> EstimateFeeRequest -> EstimateFeeRequest #

min :: EstimateFeeRequest -> EstimateFeeRequest -> EstimateFeeRequest #

Ord EstimateFeeResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: EstimateFeeResponse -> EstimateFeeResponse -> Ordering #

(<) :: EstimateFeeResponse -> EstimateFeeResponse -> Bool #

(<=) :: EstimateFeeResponse -> EstimateFeeResponse -> Bool #

(>) :: EstimateFeeResponse -> EstimateFeeResponse -> Bool #

(>=) :: EstimateFeeResponse -> EstimateFeeResponse -> Bool #

max :: EstimateFeeResponse -> EstimateFeeResponse -> EstimateFeeResponse #

min :: EstimateFeeResponse -> EstimateFeeResponse -> EstimateFeeResponse #

Ord FinalizePsbtRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: FinalizePsbtRequest -> FinalizePsbtRequest -> Ordering #

(<) :: FinalizePsbtRequest -> FinalizePsbtRequest -> Bool #

(<=) :: FinalizePsbtRequest -> FinalizePsbtRequest -> Bool #

(>) :: FinalizePsbtRequest -> FinalizePsbtRequest -> Bool #

(>=) :: FinalizePsbtRequest -> FinalizePsbtRequest -> Bool #

max :: FinalizePsbtRequest -> FinalizePsbtRequest -> FinalizePsbtRequest #

min :: FinalizePsbtRequest -> FinalizePsbtRequest -> FinalizePsbtRequest #

Ord FinalizePsbtResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: FinalizePsbtResponse -> FinalizePsbtResponse -> Ordering #

(<) :: FinalizePsbtResponse -> FinalizePsbtResponse -> Bool #

(<=) :: FinalizePsbtResponse -> FinalizePsbtResponse -> Bool #

(>) :: FinalizePsbtResponse -> FinalizePsbtResponse -> Bool #

(>=) :: FinalizePsbtResponse -> FinalizePsbtResponse -> Bool #

max :: FinalizePsbtResponse -> FinalizePsbtResponse -> FinalizePsbtResponse #

min :: FinalizePsbtResponse -> FinalizePsbtResponse -> FinalizePsbtResponse #

Ord FundPsbtRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: FundPsbtRequest -> FundPsbtRequest -> Ordering #

(<) :: FundPsbtRequest -> FundPsbtRequest -> Bool #

(<=) :: FundPsbtRequest -> FundPsbtRequest -> Bool #

(>) :: FundPsbtRequest -> FundPsbtRequest -> Bool #

(>=) :: FundPsbtRequest -> FundPsbtRequest -> Bool #

max :: FundPsbtRequest -> FundPsbtRequest -> FundPsbtRequest #

min :: FundPsbtRequest -> FundPsbtRequest -> FundPsbtRequest #

Ord FundPsbtRequest'Fees 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: FundPsbtRequest'Fees -> FundPsbtRequest'Fees -> Ordering #

(<) :: FundPsbtRequest'Fees -> FundPsbtRequest'Fees -> Bool #

(<=) :: FundPsbtRequest'Fees -> FundPsbtRequest'Fees -> Bool #

(>) :: FundPsbtRequest'Fees -> FundPsbtRequest'Fees -> Bool #

(>=) :: FundPsbtRequest'Fees -> FundPsbtRequest'Fees -> Bool #

max :: FundPsbtRequest'Fees -> FundPsbtRequest'Fees -> FundPsbtRequest'Fees #

min :: FundPsbtRequest'Fees -> FundPsbtRequest'Fees -> FundPsbtRequest'Fees #

Ord FundPsbtRequest'Template 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: FundPsbtRequest'Template -> FundPsbtRequest'Template -> Ordering #

(<) :: FundPsbtRequest'Template -> FundPsbtRequest'Template -> Bool #

(<=) :: FundPsbtRequest'Template -> FundPsbtRequest'Template -> Bool #

(>) :: FundPsbtRequest'Template -> FundPsbtRequest'Template -> Bool #

(>=) :: FundPsbtRequest'Template -> FundPsbtRequest'Template -> Bool #

max :: FundPsbtRequest'Template -> FundPsbtRequest'Template -> FundPsbtRequest'Template #

min :: FundPsbtRequest'Template -> FundPsbtRequest'Template -> FundPsbtRequest'Template #

Ord FundPsbtResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: FundPsbtResponse -> FundPsbtResponse -> Ordering #

(<) :: FundPsbtResponse -> FundPsbtResponse -> Bool #

(<=) :: FundPsbtResponse -> FundPsbtResponse -> Bool #

(>) :: FundPsbtResponse -> FundPsbtResponse -> Bool #

(>=) :: FundPsbtResponse -> FundPsbtResponse -> Bool #

max :: FundPsbtResponse -> FundPsbtResponse -> FundPsbtResponse #

min :: FundPsbtResponse -> FundPsbtResponse -> FundPsbtResponse #

Ord ImportAccountRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: ImportAccountRequest -> ImportAccountRequest -> Ordering #

(<) :: ImportAccountRequest -> ImportAccountRequest -> Bool #

(<=) :: ImportAccountRequest -> ImportAccountRequest -> Bool #

(>) :: ImportAccountRequest -> ImportAccountRequest -> Bool #

(>=) :: ImportAccountRequest -> ImportAccountRequest -> Bool #

max :: ImportAccountRequest -> ImportAccountRequest -> ImportAccountRequest #

min :: ImportAccountRequest -> ImportAccountRequest -> ImportAccountRequest #

Ord ImportAccountResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: ImportAccountResponse -> ImportAccountResponse -> Ordering #

(<) :: ImportAccountResponse -> ImportAccountResponse -> Bool #

(<=) :: ImportAccountResponse -> ImportAccountResponse -> Bool #

(>) :: ImportAccountResponse -> ImportAccountResponse -> Bool #

(>=) :: ImportAccountResponse -> ImportAccountResponse -> Bool #

max :: ImportAccountResponse -> ImportAccountResponse -> ImportAccountResponse #

min :: ImportAccountResponse -> ImportAccountResponse -> ImportAccountResponse #

Ord ImportPublicKeyRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: ImportPublicKeyRequest -> ImportPublicKeyRequest -> Ordering #

(<) :: ImportPublicKeyRequest -> ImportPublicKeyRequest -> Bool #

(<=) :: ImportPublicKeyRequest -> ImportPublicKeyRequest -> Bool #

(>) :: ImportPublicKeyRequest -> ImportPublicKeyRequest -> Bool #

(>=) :: ImportPublicKeyRequest -> ImportPublicKeyRequest -> Bool #

max :: ImportPublicKeyRequest -> ImportPublicKeyRequest -> ImportPublicKeyRequest #

min :: ImportPublicKeyRequest -> ImportPublicKeyRequest -> ImportPublicKeyRequest #

Ord ImportPublicKeyResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: ImportPublicKeyResponse -> ImportPublicKeyResponse -> Ordering #

(<) :: ImportPublicKeyResponse -> ImportPublicKeyResponse -> Bool #

(<=) :: ImportPublicKeyResponse -> ImportPublicKeyResponse -> Bool #

(>) :: ImportPublicKeyResponse -> ImportPublicKeyResponse -> Bool #

(>=) :: ImportPublicKeyResponse -> ImportPublicKeyResponse -> Bool #

max :: ImportPublicKeyResponse -> ImportPublicKeyResponse -> ImportPublicKeyResponse #

min :: ImportPublicKeyResponse -> ImportPublicKeyResponse -> ImportPublicKeyResponse #

Ord KeyReq 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: KeyReq -> KeyReq -> Ordering #

(<) :: KeyReq -> KeyReq -> Bool #

(<=) :: KeyReq -> KeyReq -> Bool #

(>) :: KeyReq -> KeyReq -> Bool #

(>=) :: KeyReq -> KeyReq -> Bool #

max :: KeyReq -> KeyReq -> KeyReq #

min :: KeyReq -> KeyReq -> KeyReq #

Ord LabelTransactionRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: LabelTransactionRequest -> LabelTransactionRequest -> Ordering #

(<) :: LabelTransactionRequest -> LabelTransactionRequest -> Bool #

(<=) :: LabelTransactionRequest -> LabelTransactionRequest -> Bool #

(>) :: LabelTransactionRequest -> LabelTransactionRequest -> Bool #

(>=) :: LabelTransactionRequest -> LabelTransactionRequest -> Bool #

max :: LabelTransactionRequest -> LabelTransactionRequest -> LabelTransactionRequest #

min :: LabelTransactionRequest -> LabelTransactionRequest -> LabelTransactionRequest #

Ord LabelTransactionResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: LabelTransactionResponse -> LabelTransactionResponse -> Ordering #

(<) :: LabelTransactionResponse -> LabelTransactionResponse -> Bool #

(<=) :: LabelTransactionResponse -> LabelTransactionResponse -> Bool #

(>) :: LabelTransactionResponse -> LabelTransactionResponse -> Bool #

(>=) :: LabelTransactionResponse -> LabelTransactionResponse -> Bool #

max :: LabelTransactionResponse -> LabelTransactionResponse -> LabelTransactionResponse #

min :: LabelTransactionResponse -> LabelTransactionResponse -> LabelTransactionResponse #

Ord LeaseOutputRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: LeaseOutputRequest -> LeaseOutputRequest -> Ordering #

(<) :: LeaseOutputRequest -> LeaseOutputRequest -> Bool #

(<=) :: LeaseOutputRequest -> LeaseOutputRequest -> Bool #

(>) :: LeaseOutputRequest -> LeaseOutputRequest -> Bool #

(>=) :: LeaseOutputRequest -> LeaseOutputRequest -> Bool #

max :: LeaseOutputRequest -> LeaseOutputRequest -> LeaseOutputRequest #

min :: LeaseOutputRequest -> LeaseOutputRequest -> LeaseOutputRequest #

Ord LeaseOutputResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: LeaseOutputResponse -> LeaseOutputResponse -> Ordering #

(<) :: LeaseOutputResponse -> LeaseOutputResponse -> Bool #

(<=) :: LeaseOutputResponse -> LeaseOutputResponse -> Bool #

(>) :: LeaseOutputResponse -> LeaseOutputResponse -> Bool #

(>=) :: LeaseOutputResponse -> LeaseOutputResponse -> Bool #

max :: LeaseOutputResponse -> LeaseOutputResponse -> LeaseOutputResponse #

min :: LeaseOutputResponse -> LeaseOutputResponse -> LeaseOutputResponse #

Ord ListAccountsRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: ListAccountsRequest -> ListAccountsRequest -> Ordering #

(<) :: ListAccountsRequest -> ListAccountsRequest -> Bool #

(<=) :: ListAccountsRequest -> ListAccountsRequest -> Bool #

(>) :: ListAccountsRequest -> ListAccountsRequest -> Bool #

(>=) :: ListAccountsRequest -> ListAccountsRequest -> Bool #

max :: ListAccountsRequest -> ListAccountsRequest -> ListAccountsRequest #

min :: ListAccountsRequest -> ListAccountsRequest -> ListAccountsRequest #

Ord ListAccountsResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: ListAccountsResponse -> ListAccountsResponse -> Ordering #

(<) :: ListAccountsResponse -> ListAccountsResponse -> Bool #

(<=) :: ListAccountsResponse -> ListAccountsResponse -> Bool #

(>) :: ListAccountsResponse -> ListAccountsResponse -> Bool #

(>=) :: ListAccountsResponse -> ListAccountsResponse -> Bool #

max :: ListAccountsResponse -> ListAccountsResponse -> ListAccountsResponse #

min :: ListAccountsResponse -> ListAccountsResponse -> ListAccountsResponse #

Ord ListLeasesRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: ListLeasesRequest -> ListLeasesRequest -> Ordering #

(<) :: ListLeasesRequest -> ListLeasesRequest -> Bool #

(<=) :: ListLeasesRequest -> ListLeasesRequest -> Bool #

(>) :: ListLeasesRequest -> ListLeasesRequest -> Bool #

(>=) :: ListLeasesRequest -> ListLeasesRequest -> Bool #

max :: ListLeasesRequest -> ListLeasesRequest -> ListLeasesRequest #

min :: ListLeasesRequest -> ListLeasesRequest -> ListLeasesRequest #

Ord ListLeasesResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: ListLeasesResponse -> ListLeasesResponse -> Ordering #

(<) :: ListLeasesResponse -> ListLeasesResponse -> Bool #

(<=) :: ListLeasesResponse -> ListLeasesResponse -> Bool #

(>) :: ListLeasesResponse -> ListLeasesResponse -> Bool #

(>=) :: ListLeasesResponse -> ListLeasesResponse -> Bool #

max :: ListLeasesResponse -> ListLeasesResponse -> ListLeasesResponse #

min :: ListLeasesResponse -> ListLeasesResponse -> ListLeasesResponse #

Ord ListSweepsRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: ListSweepsRequest -> ListSweepsRequest -> Ordering #

(<) :: ListSweepsRequest -> ListSweepsRequest -> Bool #

(<=) :: ListSweepsRequest -> ListSweepsRequest -> Bool #

(>) :: ListSweepsRequest -> ListSweepsRequest -> Bool #

(>=) :: ListSweepsRequest -> ListSweepsRequest -> Bool #

max :: ListSweepsRequest -> ListSweepsRequest -> ListSweepsRequest #

min :: ListSweepsRequest -> ListSweepsRequest -> ListSweepsRequest #

Ord ListSweepsResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: ListSweepsResponse -> ListSweepsResponse -> Ordering #

(<) :: ListSweepsResponse -> ListSweepsResponse -> Bool #

(<=) :: ListSweepsResponse -> ListSweepsResponse -> Bool #

(>) :: ListSweepsResponse -> ListSweepsResponse -> Bool #

(>=) :: ListSweepsResponse -> ListSweepsResponse -> Bool #

max :: ListSweepsResponse -> ListSweepsResponse -> ListSweepsResponse #

min :: ListSweepsResponse -> ListSweepsResponse -> ListSweepsResponse #

Ord ListSweepsResponse'Sweeps 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: ListSweepsResponse'Sweeps -> ListSweepsResponse'Sweeps -> Ordering #

(<) :: ListSweepsResponse'Sweeps -> ListSweepsResponse'Sweeps -> Bool #

(<=) :: ListSweepsResponse'Sweeps -> ListSweepsResponse'Sweeps -> Bool #

(>) :: ListSweepsResponse'Sweeps -> ListSweepsResponse'Sweeps -> Bool #

(>=) :: ListSweepsResponse'Sweeps -> ListSweepsResponse'Sweeps -> Bool #

max :: ListSweepsResponse'Sweeps -> ListSweepsResponse'Sweeps -> ListSweepsResponse'Sweeps #

min :: ListSweepsResponse'Sweeps -> ListSweepsResponse'Sweeps -> ListSweepsResponse'Sweeps #

Ord ListSweepsResponse'TransactionIDs 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: ListSweepsResponse'TransactionIDs -> ListSweepsResponse'TransactionIDs -> Ordering #

(<) :: ListSweepsResponse'TransactionIDs -> ListSweepsResponse'TransactionIDs -> Bool #

(<=) :: ListSweepsResponse'TransactionIDs -> ListSweepsResponse'TransactionIDs -> Bool #

(>) :: ListSweepsResponse'TransactionIDs -> ListSweepsResponse'TransactionIDs -> Bool #

(>=) :: ListSweepsResponse'TransactionIDs -> ListSweepsResponse'TransactionIDs -> Bool #

max :: ListSweepsResponse'TransactionIDs -> ListSweepsResponse'TransactionIDs -> ListSweepsResponse'TransactionIDs #

min :: ListSweepsResponse'TransactionIDs -> ListSweepsResponse'TransactionIDs -> ListSweepsResponse'TransactionIDs #

Ord ListUnspentRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: ListUnspentRequest -> ListUnspentRequest -> Ordering #

(<) :: ListUnspentRequest -> ListUnspentRequest -> Bool #

(<=) :: ListUnspentRequest -> ListUnspentRequest -> Bool #

(>) :: ListUnspentRequest -> ListUnspentRequest -> Bool #

(>=) :: ListUnspentRequest -> ListUnspentRequest -> Bool #

max :: ListUnspentRequest -> ListUnspentRequest -> ListUnspentRequest #

min :: ListUnspentRequest -> ListUnspentRequest -> ListUnspentRequest #

Ord ListUnspentResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: ListUnspentResponse -> ListUnspentResponse -> Ordering #

(<) :: ListUnspentResponse -> ListUnspentResponse -> Bool #

(<=) :: ListUnspentResponse -> ListUnspentResponse -> Bool #

(>) :: ListUnspentResponse -> ListUnspentResponse -> Bool #

(>=) :: ListUnspentResponse -> ListUnspentResponse -> Bool #

max :: ListUnspentResponse -> ListUnspentResponse -> ListUnspentResponse #

min :: ListUnspentResponse -> ListUnspentResponse -> ListUnspentResponse #

Ord PendingSweep 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: PendingSweep -> PendingSweep -> Ordering #

(<) :: PendingSweep -> PendingSweep -> Bool #

(<=) :: PendingSweep -> PendingSweep -> Bool #

(>) :: PendingSweep -> PendingSweep -> Bool #

(>=) :: PendingSweep -> PendingSweep -> Bool #

max :: PendingSweep -> PendingSweep -> PendingSweep #

min :: PendingSweep -> PendingSweep -> PendingSweep #

Ord PendingSweepsRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: PendingSweepsRequest -> PendingSweepsRequest -> Ordering #

(<) :: PendingSweepsRequest -> PendingSweepsRequest -> Bool #

(<=) :: PendingSweepsRequest -> PendingSweepsRequest -> Bool #

(>) :: PendingSweepsRequest -> PendingSweepsRequest -> Bool #

(>=) :: PendingSweepsRequest -> PendingSweepsRequest -> Bool #

max :: PendingSweepsRequest -> PendingSweepsRequest -> PendingSweepsRequest #

min :: PendingSweepsRequest -> PendingSweepsRequest -> PendingSweepsRequest #

Ord PendingSweepsResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: PendingSweepsResponse -> PendingSweepsResponse -> Ordering #

(<) :: PendingSweepsResponse -> PendingSweepsResponse -> Bool #

(<=) :: PendingSweepsResponse -> PendingSweepsResponse -> Bool #

(>) :: PendingSweepsResponse -> PendingSweepsResponse -> Bool #

(>=) :: PendingSweepsResponse -> PendingSweepsResponse -> Bool #

max :: PendingSweepsResponse -> PendingSweepsResponse -> PendingSweepsResponse #

min :: PendingSweepsResponse -> PendingSweepsResponse -> PendingSweepsResponse #

Ord PublishResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: PublishResponse -> PublishResponse -> Ordering #

(<) :: PublishResponse -> PublishResponse -> Bool #

(<=) :: PublishResponse -> PublishResponse -> Bool #

(>) :: PublishResponse -> PublishResponse -> Bool #

(>=) :: PublishResponse -> PublishResponse -> Bool #

max :: PublishResponse -> PublishResponse -> PublishResponse #

min :: PublishResponse -> PublishResponse -> PublishResponse #

Ord ReleaseOutputRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: ReleaseOutputRequest -> ReleaseOutputRequest -> Ordering #

(<) :: ReleaseOutputRequest -> ReleaseOutputRequest -> Bool #

(<=) :: ReleaseOutputRequest -> ReleaseOutputRequest -> Bool #

(>) :: ReleaseOutputRequest -> ReleaseOutputRequest -> Bool #

(>=) :: ReleaseOutputRequest -> ReleaseOutputRequest -> Bool #

max :: ReleaseOutputRequest -> ReleaseOutputRequest -> ReleaseOutputRequest #

min :: ReleaseOutputRequest -> ReleaseOutputRequest -> ReleaseOutputRequest #

Ord ReleaseOutputResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: ReleaseOutputResponse -> ReleaseOutputResponse -> Ordering #

(<) :: ReleaseOutputResponse -> ReleaseOutputResponse -> Bool #

(<=) :: ReleaseOutputResponse -> ReleaseOutputResponse -> Bool #

(>) :: ReleaseOutputResponse -> ReleaseOutputResponse -> Bool #

(>=) :: ReleaseOutputResponse -> ReleaseOutputResponse -> Bool #

max :: ReleaseOutputResponse -> ReleaseOutputResponse -> ReleaseOutputResponse #

min :: ReleaseOutputResponse -> ReleaseOutputResponse -> ReleaseOutputResponse #

Ord SendOutputsRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: SendOutputsRequest -> SendOutputsRequest -> Ordering #

(<) :: SendOutputsRequest -> SendOutputsRequest -> Bool #

(<=) :: SendOutputsRequest -> SendOutputsRequest -> Bool #

(>) :: SendOutputsRequest -> SendOutputsRequest -> Bool #

(>=) :: SendOutputsRequest -> SendOutputsRequest -> Bool #

max :: SendOutputsRequest -> SendOutputsRequest -> SendOutputsRequest #

min :: SendOutputsRequest -> SendOutputsRequest -> SendOutputsRequest #

Ord SendOutputsResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: SendOutputsResponse -> SendOutputsResponse -> Ordering #

(<) :: SendOutputsResponse -> SendOutputsResponse -> Bool #

(<=) :: SendOutputsResponse -> SendOutputsResponse -> Bool #

(>) :: SendOutputsResponse -> SendOutputsResponse -> Bool #

(>=) :: SendOutputsResponse -> SendOutputsResponse -> Bool #

max :: SendOutputsResponse -> SendOutputsResponse -> SendOutputsResponse #

min :: SendOutputsResponse -> SendOutputsResponse -> SendOutputsResponse #

Ord Transaction 
Instance details

Defined in Proto.Walletrpc.Walletkit

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 TxTemplate 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: TxTemplate -> TxTemplate -> Ordering #

(<) :: TxTemplate -> TxTemplate -> Bool #

(<=) :: TxTemplate -> TxTemplate -> Bool #

(>) :: TxTemplate -> TxTemplate -> Bool #

(>=) :: TxTemplate -> TxTemplate -> Bool #

max :: TxTemplate -> TxTemplate -> TxTemplate #

min :: TxTemplate -> TxTemplate -> TxTemplate #

Ord TxTemplate'OutputsEntry 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: TxTemplate'OutputsEntry -> TxTemplate'OutputsEntry -> Ordering #

(<) :: TxTemplate'OutputsEntry -> TxTemplate'OutputsEntry -> Bool #

(<=) :: TxTemplate'OutputsEntry -> TxTemplate'OutputsEntry -> Bool #

(>) :: TxTemplate'OutputsEntry -> TxTemplate'OutputsEntry -> Bool #

(>=) :: TxTemplate'OutputsEntry -> TxTemplate'OutputsEntry -> Bool #

max :: TxTemplate'OutputsEntry -> TxTemplate'OutputsEntry -> TxTemplate'OutputsEntry #

min :: TxTemplate'OutputsEntry -> TxTemplate'OutputsEntry -> TxTemplate'OutputsEntry #

Ord UtxoLease 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: UtxoLease -> UtxoLease -> Ordering #

(<) :: UtxoLease -> UtxoLease -> Bool #

(<=) :: UtxoLease -> UtxoLease -> Bool #

(>) :: UtxoLease -> UtxoLease -> Bool #

(>=) :: UtxoLease -> UtxoLease -> Bool #

max :: UtxoLease -> UtxoLease -> UtxoLease #

min :: UtxoLease -> UtxoLease -> UtxoLease #

Ord WitnessType 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: WitnessType -> WitnessType -> Ordering #

(<) :: WitnessType -> WitnessType -> Bool #

(<=) :: WitnessType -> WitnessType -> Bool #

(>) :: WitnessType -> WitnessType -> Bool #

(>=) :: WitnessType -> WitnessType -> Bool #

max :: WitnessType -> WitnessType -> WitnessType #

min :: WitnessType -> WitnessType -> WitnessType #

Ord WitnessType'UnrecognizedValue 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

compare :: WitnessType'UnrecognizedValue -> WitnessType'UnrecognizedValue -> Ordering #

(<) :: WitnessType'UnrecognizedValue -> WitnessType'UnrecognizedValue -> Bool #

(<=) :: WitnessType'UnrecognizedValue -> WitnessType'UnrecognizedValue -> Bool #

(>) :: WitnessType'UnrecognizedValue -> WitnessType'UnrecognizedValue -> Bool #

(>=) :: WitnessType'UnrecognizedValue -> WitnessType'UnrecognizedValue -> Bool #

max :: WitnessType'UnrecognizedValue -> WitnessType'UnrecognizedValue -> WitnessType'UnrecognizedValue #

min :: WitnessType'UnrecognizedValue -> WitnessType'UnrecognizedValue -> WitnessType'UnrecognizedValue #

Ord ChangePasswordRequest 
Instance details

Defined in Proto.Walletunlocker

Methods

compare :: ChangePasswordRequest -> ChangePasswordRequest -> Ordering #

(<) :: ChangePasswordRequest -> ChangePasswordRequest -> Bool #

(<=) :: ChangePasswordRequest -> ChangePasswordRequest -> Bool #

(>) :: ChangePasswordRequest -> ChangePasswordRequest -> Bool #

(>=) :: ChangePasswordRequest -> ChangePasswordRequest -> Bool #

max :: ChangePasswordRequest -> ChangePasswordRequest -> ChangePasswordRequest #

min :: ChangePasswordRequest -> ChangePasswordRequest -> ChangePasswordRequest #

Ord ChangePasswordResponse 
Instance details

Defined in Proto.Walletunlocker

Methods

compare :: ChangePasswordResponse -> ChangePasswordResponse -> Ordering #

(<) :: ChangePasswordResponse -> ChangePasswordResponse -> Bool #

(<=) :: ChangePasswordResponse -> ChangePasswordResponse -> Bool #

(>) :: ChangePasswordResponse -> ChangePasswordResponse -> Bool #

(>=) :: ChangePasswordResponse -> ChangePasswordResponse -> Bool #

max :: ChangePasswordResponse -> ChangePasswordResponse -> ChangePasswordResponse #

min :: ChangePasswordResponse -> ChangePasswordResponse -> ChangePasswordResponse #

Ord GenSeedRequest 
Instance details

Defined in Proto.Walletunlocker

Methods

compare :: GenSeedRequest -> GenSeedRequest -> Ordering #

(<) :: GenSeedRequest -> GenSeedRequest -> Bool #

(<=) :: GenSeedRequest -> GenSeedRequest -> Bool #

(>) :: GenSeedRequest -> GenSeedRequest -> Bool #

(>=) :: GenSeedRequest -> GenSeedRequest -> Bool #

max :: GenSeedRequest -> GenSeedRequest -> GenSeedRequest #

min :: GenSeedRequest -> GenSeedRequest -> GenSeedRequest #

Ord GenSeedResponse 
Instance details

Defined in Proto.Walletunlocker

Methods

compare :: GenSeedResponse -> GenSeedResponse -> Ordering #

(<) :: GenSeedResponse -> GenSeedResponse -> Bool #

(<=) :: GenSeedResponse -> GenSeedResponse -> Bool #

(>) :: GenSeedResponse -> GenSeedResponse -> Bool #

(>=) :: GenSeedResponse -> GenSeedResponse -> Bool #

max :: GenSeedResponse -> GenSeedResponse -> GenSeedResponse #

min :: GenSeedResponse -> GenSeedResponse -> GenSeedResponse #

Ord InitWalletRequest 
Instance details

Defined in Proto.Walletunlocker

Methods

compare :: InitWalletRequest -> InitWalletRequest -> Ordering #

(<) :: InitWalletRequest -> InitWalletRequest -> Bool #

(<=) :: InitWalletRequest -> InitWalletRequest -> Bool #

(>) :: InitWalletRequest -> InitWalletRequest -> Bool #

(>=) :: InitWalletRequest -> InitWalletRequest -> Bool #

max :: InitWalletRequest -> InitWalletRequest -> InitWalletRequest #

min :: InitWalletRequest -> InitWalletRequest -> InitWalletRequest #

Ord InitWalletResponse 
Instance details

Defined in Proto.Walletunlocker

Methods

compare :: InitWalletResponse -> InitWalletResponse -> Ordering #

(<) :: InitWalletResponse -> InitWalletResponse -> Bool #

(<=) :: InitWalletResponse -> InitWalletResponse -> Bool #

(>) :: InitWalletResponse -> InitWalletResponse -> Bool #

(>=) :: InitWalletResponse -> InitWalletResponse -> Bool #

max :: InitWalletResponse -> InitWalletResponse -> InitWalletResponse #

min :: InitWalletResponse -> InitWalletResponse -> InitWalletResponse #

Ord UnlockWalletRequest 
Instance details

Defined in Proto.Walletunlocker

Methods

compare :: UnlockWalletRequest -> UnlockWalletRequest -> Ordering #

(<) :: UnlockWalletRequest -> UnlockWalletRequest -> Bool #

(<=) :: UnlockWalletRequest -> UnlockWalletRequest -> Bool #

(>) :: UnlockWalletRequest -> UnlockWalletRequest -> Bool #

(>=) :: UnlockWalletRequest -> UnlockWalletRequest -> Bool #

max :: UnlockWalletRequest -> UnlockWalletRequest -> UnlockWalletRequest #

min :: UnlockWalletRequest -> UnlockWalletRequest -> UnlockWalletRequest #

Ord UnlockWalletResponse 
Instance details

Defined in Proto.Walletunlocker

Methods

compare :: UnlockWalletResponse -> UnlockWalletResponse -> Ordering #

(<) :: UnlockWalletResponse -> UnlockWalletResponse -> Bool #

(<=) :: UnlockWalletResponse -> UnlockWalletResponse -> Bool #

(>) :: UnlockWalletResponse -> UnlockWalletResponse -> Bool #

(>=) :: UnlockWalletResponse -> UnlockWalletResponse -> Bool #

max :: UnlockWalletResponse -> UnlockWalletResponse -> UnlockWalletResponse #

min :: UnlockWalletResponse -> UnlockWalletResponse -> UnlockWalletResponse #

Ord WatchOnly 
Instance details

Defined in Proto.Walletunlocker

Methods

compare :: WatchOnly -> WatchOnly -> Ordering #

(<) :: WatchOnly -> WatchOnly -> Bool #

(<=) :: WatchOnly -> WatchOnly -> Bool #

(>) :: WatchOnly -> WatchOnly -> Bool #

(>=) :: WatchOnly -> WatchOnly -> Bool #

max :: WatchOnly -> WatchOnly -> WatchOnly #

min :: WatchOnly -> WatchOnly -> WatchOnly #

Ord WatchOnlyAccount 
Instance details

Defined in Proto.Walletunlocker

Methods

compare :: WatchOnlyAccount -> WatchOnlyAccount -> Ordering #

(<) :: WatchOnlyAccount -> WatchOnlyAccount -> Bool #

(<=) :: WatchOnlyAccount -> WatchOnlyAccount -> Bool #

(>) :: WatchOnlyAccount -> WatchOnlyAccount -> Bool #

(>=) :: WatchOnlyAccount -> WatchOnlyAccount -> Bool #

max :: WatchOnlyAccount -> WatchOnlyAccount -> WatchOnlyAccount #

min :: WatchOnlyAccount -> WatchOnlyAccount -> WatchOnlyAccount #

Ord LogLevel 
Instance details

Defined in Control.Monad.Logger

Ord Family 
Instance details

Defined in Network.Socket.Types

Ord PortNumber 
Instance details

Defined in Network.Socket.Types

Ord SockAddr 
Instance details

Defined in Network.Socket.Types

Ord SocketType 
Instance details

Defined in Network.Socket.Types

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 BlockChainInfo 
Instance details

Defined in Network.Bitcoin.BlockChain

Methods

compare :: BlockChainInfo -> BlockChainInfo -> Ordering #

(<) :: BlockChainInfo -> BlockChainInfo -> Bool #

(<=) :: BlockChainInfo -> BlockChainInfo -> Bool #

(>) :: BlockChainInfo -> BlockChainInfo -> Bool #

(>=) :: BlockChainInfo -> BlockChainInfo -> Bool #

max :: BlockChainInfo -> BlockChainInfo -> BlockChainInfo #

min :: BlockChainInfo -> BlockChainInfo -> BlockChainInfo #

Ord BlockVerbose 
Instance details

Defined in Network.Bitcoin.BlockChain

Methods

compare :: BlockVerbose -> BlockVerbose -> Ordering #

(<) :: BlockVerbose -> BlockVerbose -> Bool #

(<=) :: BlockVerbose -> BlockVerbose -> Bool #

(>) :: BlockVerbose -> BlockVerbose -> Bool #

(>=) :: BlockVerbose -> BlockVerbose -> Bool #

max :: BlockVerbose -> BlockVerbose -> BlockVerbose #

min :: BlockVerbose -> BlockVerbose -> BlockVerbose #

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 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 BlockInfo 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

compare :: BlockInfo -> BlockInfo -> Ordering #

(<) :: BlockInfo -> BlockInfo -> Bool #

(<=) :: BlockInfo -> BlockInfo -> Bool #

(>) :: BlockInfo -> BlockInfo -> Bool #

(>=) :: BlockInfo -> BlockInfo -> Bool #

max :: BlockInfo -> BlockInfo -> BlockInfo #

min :: BlockInfo -> BlockInfo -> BlockInfo #

Ord DecodedPsbt 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

compare :: DecodedPsbt -> DecodedPsbt -> Ordering #

(<) :: DecodedPsbt -> DecodedPsbt -> Bool #

(<=) :: DecodedPsbt -> DecodedPsbt -> Bool #

(>) :: DecodedPsbt -> DecodedPsbt -> Bool #

(>=) :: DecodedPsbt -> DecodedPsbt -> Bool #

max :: DecodedPsbt -> DecodedPsbt -> DecodedPsbt #

min :: DecodedPsbt -> DecodedPsbt -> DecodedPsbt #

Ord DecodedRawTransaction 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

compare :: DecodedRawTransaction -> DecodedRawTransaction -> Ordering #

(<) :: DecodedRawTransaction -> DecodedRawTransaction -> Bool #

(<=) :: DecodedRawTransaction -> DecodedRawTransaction -> Bool #

(>) :: DecodedRawTransaction -> DecodedRawTransaction -> Bool #

(>=) :: DecodedRawTransaction -> DecodedRawTransaction -> Bool #

max :: DecodedRawTransaction -> DecodedRawTransaction -> DecodedRawTransaction #

min :: DecodedRawTransaction -> DecodedRawTransaction -> DecodedRawTransaction #

Ord RawTransactionInfo 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

compare :: RawTransactionInfo -> RawTransactionInfo -> Ordering #

(<) :: RawTransactionInfo -> RawTransactionInfo -> Bool #

(<=) :: RawTransactionInfo -> RawTransactionInfo -> Bool #

(>) :: RawTransactionInfo -> RawTransactionInfo -> Bool #

(>=) :: RawTransactionInfo -> RawTransactionInfo -> Bool #

max :: RawTransactionInfo -> RawTransactionInfo -> RawTransactionInfo #

min :: RawTransactionInfo -> RawTransactionInfo -> RawTransactionInfo #

Ord ScriptPubKey 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

compare :: ScriptPubKey -> ScriptPubKey -> Ordering #

(<) :: ScriptPubKey -> ScriptPubKey -> Bool #

(<=) :: ScriptPubKey -> ScriptPubKey -> Bool #

(>) :: ScriptPubKey -> ScriptPubKey -> Bool #

(>=) :: ScriptPubKey -> ScriptPubKey -> Bool #

max :: ScriptPubKey -> ScriptPubKey -> ScriptPubKey #

min :: ScriptPubKey -> ScriptPubKey -> ScriptPubKey #

Ord ScriptSig 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

compare :: ScriptSig -> ScriptSig -> Ordering #

(<) :: ScriptSig -> ScriptSig -> Bool #

(<=) :: ScriptSig -> ScriptSig -> Bool #

(>) :: ScriptSig -> ScriptSig -> Bool #

(>=) :: ScriptSig -> ScriptSig -> Bool #

max :: ScriptSig -> ScriptSig -> ScriptSig #

min :: ScriptSig -> ScriptSig -> ScriptSig #

Ord TxIn 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

compare :: TxIn -> TxIn -> Ordering #

(<) :: TxIn -> TxIn -> Bool #

(<=) :: TxIn -> TxIn -> Bool #

(>) :: TxIn -> TxIn -> Bool #

(>=) :: TxIn -> TxIn -> Bool #

max :: TxIn -> TxIn -> TxIn #

min :: TxIn -> TxIn -> TxIn #

Ord TxOut 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

compare :: TxOut -> TxOut -> Ordering #

(<) :: TxOut -> TxOut -> Bool #

(<=) :: TxOut -> TxOut -> Bool #

(>) :: TxOut -> TxOut -> Bool #

(>=) :: TxOut -> TxOut -> Bool #

max :: TxOut -> TxOut -> TxOut #

min :: TxOut -> TxOut -> TxOut #

Ord TxnOutputType 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

compare :: TxnOutputType -> TxnOutputType -> Ordering #

(<) :: TxnOutputType -> TxnOutputType -> Bool #

(<=) :: TxnOutputType -> TxnOutputType -> Bool #

(>) :: TxnOutputType -> TxnOutputType -> Bool #

(>=) :: TxnOutputType -> TxnOutputType -> Bool #

max :: TxnOutputType -> TxnOutputType -> TxnOutputType #

min :: TxnOutputType -> TxnOutputType -> TxnOutputType #

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 TransactionID 
Instance details

Defined in Network.Bitcoin.Types

Methods

compare :: TransactionID -> TransactionID -> Ordering #

(<) :: TransactionID -> TransactionID -> Bool #

(<=) :: TransactionID -> TransactionID -> Bool #

(>) :: TransactionID -> TransactionID -> Bool #

(>=) :: TransactionID -> TransactionID -> Bool #

max :: TransactionID -> TransactionID -> TransactionID #

min :: TransactionID -> TransactionID -> TransactionID #

Ord AddrInfo 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

compare :: AddrInfo -> AddrInfo -> Ordering #

(<) :: AddrInfo -> AddrInfo -> Bool #

(<=) :: AddrInfo -> AddrInfo -> Bool #

(>) :: AddrInfo -> AddrInfo -> Bool #

(>=) :: AddrInfo -> AddrInfo -> Bool #

max :: AddrInfo -> AddrInfo -> AddrInfo #

min :: AddrInfo -> AddrInfo -> AddrInfo #

Ord AddressInfo 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

compare :: AddressInfo -> AddressInfo -> Ordering #

(<) :: AddressInfo -> AddressInfo -> Bool #

(<=) :: AddressInfo -> AddressInfo -> Bool #

(>) :: AddressInfo -> AddressInfo -> Bool #

(>=) :: AddressInfo -> AddressInfo -> Bool #

max :: AddressInfo -> AddressInfo -> AddressInfo #

min :: AddressInfo -> AddressInfo -> AddressInfo #

Ord BitcoindInfo 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

compare :: BitcoindInfo -> BitcoindInfo -> Ordering #

(<) :: BitcoindInfo -> BitcoindInfo -> Bool #

(<=) :: BitcoindInfo -> BitcoindInfo -> Bool #

(>) :: BitcoindInfo -> BitcoindInfo -> Bool #

(>=) :: BitcoindInfo -> BitcoindInfo -> Bool #

max :: BitcoindInfo -> BitcoindInfo -> BitcoindInfo #

min :: BitcoindInfo -> BitcoindInfo -> BitcoindInfo #

Ord DetailedTransaction 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

compare :: DetailedTransaction -> DetailedTransaction -> Ordering #

(<) :: DetailedTransaction -> DetailedTransaction -> Bool #

(<=) :: DetailedTransaction -> DetailedTransaction -> Bool #

(>) :: DetailedTransaction -> DetailedTransaction -> Bool #

(>=) :: DetailedTransaction -> DetailedTransaction -> Bool #

max :: DetailedTransaction -> DetailedTransaction -> DetailedTransaction #

min :: DetailedTransaction -> DetailedTransaction -> DetailedTransaction #

Ord DetailedTransactionDetails 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

compare :: DetailedTransactionDetails -> DetailedTransactionDetails -> Ordering #

(<) :: DetailedTransactionDetails -> DetailedTransactionDetails -> Bool #

(<=) :: DetailedTransactionDetails -> DetailedTransactionDetails -> Bool #

(>) :: DetailedTransactionDetails -> DetailedTransactionDetails -> Bool #

(>=) :: DetailedTransactionDetails -> DetailedTransactionDetails -> Bool #

max :: DetailedTransactionDetails -> DetailedTransactionDetails -> DetailedTransactionDetails #

min :: DetailedTransactionDetails -> DetailedTransactionDetails -> DetailedTransactionDetails #

Ord ReceivedByAccount 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

compare :: ReceivedByAccount -> ReceivedByAccount -> Ordering #

(<) :: ReceivedByAccount -> ReceivedByAccount -> Bool #

(<=) :: ReceivedByAccount -> ReceivedByAccount -> Bool #

(>) :: ReceivedByAccount -> ReceivedByAccount -> Bool #

(>=) :: ReceivedByAccount -> ReceivedByAccount -> Bool #

max :: ReceivedByAccount -> ReceivedByAccount -> ReceivedByAccount #

min :: ReceivedByAccount -> ReceivedByAccount -> ReceivedByAccount #

Ord ReceivedByAddress 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

compare :: ReceivedByAddress -> ReceivedByAddress -> Ordering #

(<) :: ReceivedByAddress -> ReceivedByAddress -> Bool #

(<=) :: ReceivedByAddress -> ReceivedByAddress -> Bool #

(>) :: ReceivedByAddress -> ReceivedByAddress -> Bool #

(>=) :: ReceivedByAddress -> ReceivedByAddress -> Bool #

max :: ReceivedByAddress -> ReceivedByAddress -> ReceivedByAddress #

min :: ReceivedByAddress -> ReceivedByAddress -> ReceivedByAddress #

Ord ScrPubKey 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

compare :: ScrPubKey -> ScrPubKey -> Ordering #

(<) :: ScrPubKey -> ScrPubKey -> Bool #

(<=) :: ScrPubKey -> ScrPubKey -> Bool #

(>) :: ScrPubKey -> ScrPubKey -> Bool #

(>=) :: ScrPubKey -> ScrPubKey -> Bool #

max :: ScrPubKey -> ScrPubKey -> ScrPubKey #

min :: ScrPubKey -> ScrPubKey -> ScrPubKey #

Ord SimpleTransaction 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

compare :: SimpleTransaction -> SimpleTransaction -> Ordering #

(<) :: SimpleTransaction -> SimpleTransaction -> Bool #

(<=) :: SimpleTransaction -> SimpleTransaction -> Bool #

(>) :: SimpleTransaction -> SimpleTransaction -> Bool #

(>=) :: SimpleTransaction -> SimpleTransaction -> Bool #

max :: SimpleTransaction -> SimpleTransaction -> SimpleTransaction #

min :: SimpleTransaction -> SimpleTransaction -> SimpleTransaction #

Ord SinceBlock 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

compare :: SinceBlock -> SinceBlock -> Ordering #

(<) :: SinceBlock -> SinceBlock -> Bool #

(<=) :: SinceBlock -> SinceBlock -> Bool #

(>) :: SinceBlock -> SinceBlock -> Bool #

(>=) :: SinceBlock -> SinceBlock -> Bool #

max :: SinceBlock -> SinceBlock -> SinceBlock #

min :: SinceBlock -> SinceBlock -> SinceBlock #

Ord TransactionCategory 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

compare :: TransactionCategory -> TransactionCategory -> Ordering #

(<) :: TransactionCategory -> TransactionCategory -> Bool #

(<=) :: TransactionCategory -> TransactionCategory -> Bool #

(>) :: TransactionCategory -> TransactionCategory -> Bool #

(>=) :: TransactionCategory -> TransactionCategory -> Bool #

max :: TransactionCategory -> TransactionCategory -> TransactionCategory #

min :: TransactionCategory -> TransactionCategory -> TransactionCategory #

Ord URI 
Instance details

Defined in Network.URI

Methods

compare :: URI -> URI -> Ordering #

(<) :: URI -> URI -> Bool #

(<=) :: URI -> URI -> Bool #

(>) :: URI -> URI -> Bool #

(>=) :: URI -> URI -> Bool #

max :: URI -> URI -> URI #

min :: URI -> URI -> URI #

Ord URIAuth 
Instance details

Defined in Network.URI

Ord OverflowNatural 
Instance details

Defined in Database.Persist.Class.PersistField

Ord ConstraintNameDB 
Instance details

Defined in Database.Persist.Names

Ord ConstraintNameHS 
Instance details

Defined in Database.Persist.Names

Ord EntityNameDB 
Instance details

Defined in Database.Persist.Names

Ord EntityNameHS 
Instance details

Defined in Database.Persist.Names

Ord FieldNameDB 
Instance details

Defined in Database.Persist.Names

Ord FieldNameHS 
Instance details

Defined in Database.Persist.Names

Ord LiteralType 
Instance details

Defined in Database.Persist.PersistValue

Ord PersistValue 
Instance details

Defined in Database.Persist.PersistValue

Ord ForeignFieldReference 
Instance details

Defined in Database.Persist.Quasi.Internal

Ord PrimarySpec 
Instance details

Defined in Database.Persist.Quasi.Internal

Ord UnboundCompositeDef 
Instance details

Defined in Database.Persist.Quasi.Internal

Ord UnboundEntityDef 
Instance details

Defined in Database.Persist.Quasi.Internal

Ord UnboundFieldDef 
Instance details

Defined in Database.Persist.Quasi.Internal

Ord UnboundForeignDef 
Instance details

Defined in Database.Persist.Quasi.Internal

Ord UnboundForeignFieldList 
Instance details

Defined in Database.Persist.Quasi.Internal

Ord UnboundIdDef 
Instance details

Defined in Database.Persist.Quasi.Internal

Ord Column 
Instance details

Defined in Database.Persist.Sql.Types

Ord ColumnReference 
Instance details

Defined in Database.Persist.Sql.Types

Ord IsolationLevel 
Instance details

Defined in Database.Persist.SqlBackend.Internal.IsolationLevel

Ord CascadeAction 
Instance details

Defined in Database.Persist.Types.Base

Ord Checkmark 
Instance details

Defined in Database.Persist.Types.Base

Ord CompositeDef 
Instance details

Defined in Database.Persist.Types.Base

Ord EmbedEntityDef 
Instance details

Defined in Database.Persist.Types.Base

Ord EmbedFieldDef 
Instance details

Defined in Database.Persist.Types.Base

Ord EntityDef 
Instance details

Defined in Database.Persist.Types.Base

Ord EntityIdDef 
Instance details

Defined in Database.Persist.Types.Base

Ord FieldAttr 
Instance details

Defined in Database.Persist.Types.Base

Ord FieldCascade 
Instance details

Defined in Database.Persist.Types.Base

Ord FieldDef 
Instance details

Defined in Database.Persist.Types.Base

Ord FieldType 
Instance details

Defined in Database.Persist.Types.Base

Ord ForeignDef 
Instance details

Defined in Database.Persist.Types.Base

Ord ReferenceDef 
Instance details

Defined in Database.Persist.Types.Base

Ord SelfEmbed 
Instance details

Defined in Database.Persist.Types.Base

Methods

compare :: SelfEmbed -> SelfEmbed -> Ordering #

(<) :: SelfEmbed -> SelfEmbed -> Bool #

(<=) :: SelfEmbed -> SelfEmbed -> Bool #

(>) :: SelfEmbed -> SelfEmbed -> Bool #

(>=) :: SelfEmbed -> SelfEmbed -> Bool #

max :: SelfEmbed -> SelfEmbed -> SelfEmbed #

min :: SelfEmbed -> SelfEmbed -> SelfEmbed #

Ord SqlType 
Instance details

Defined in Database.Persist.Types.Base

Ord UniqueDef 
Instance details

Defined in Database.Persist.Types.Base

Ord FusionDepth 
Instance details

Defined in Prettyprinter.Internal

Ord LayoutOptions 
Instance details

Defined in Prettyprinter.Internal

Ord PageWidth 
Instance details

Defined in Prettyprinter.Internal

Ord AnsiStyle 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Ord Bold 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

compare :: Bold -> Bold -> Ordering #

(<) :: Bold -> Bold -> Bool #

(<=) :: Bold -> Bold -> Bool #

(>) :: Bold -> Bold -> Bool #

(>=) :: Bold -> Bold -> Bool #

max :: Bold -> Bold -> Bold #

min :: Bold -> Bold -> Bold #

Ord Color 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

compare :: Color -> Color -> Ordering #

(<) :: Color -> Color -> Bool #

(<=) :: Color -> Color -> Bool #

(>) :: Color -> Color -> Bool #

(>=) :: Color -> Color -> Bool #

max :: Color -> Color -> Color #

min :: Color -> Color -> Color #

Ord Intensity 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Ord Italicized 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Ord Layer 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

compare :: Layer -> Layer -> Ordering #

(<) :: Layer -> Layer -> Bool #

(<=) :: Layer -> Layer -> Bool #

(>) :: Layer -> Layer -> Bool #

(>=) :: Layer -> Layer -> Bool #

max :: Layer -> Layer -> Layer #

min :: Layer -> Layer -> Layer #

Ord Underlined 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Ord ByteArray

Non-lexicographic ordering. This compares the lengths of the byte arrays first and uses a lexicographic ordering if the lengths are equal. Subject to change between major versions.

Since: primitive-0.6.3.0

Instance details

Defined in Data.Primitive.ByteArray

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 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 ReleaseType 
Instance details

Defined in Data.Acquire.Internal

Ord Scientific

Scientific numbers can be safely compared for ordering. No magnitude 10^e is calculated so there's no risk of a blowup in space or time when comparing scientific numbers coming from untrusted sources.

Instance details

Defined in Data.Scientific

Ord AbsoluteSize 
Instance details

Defined in Text.Internal.CssCommon

Ord EmSize 
Instance details

Defined in Text.Internal.CssCommon

Ord ExSize 
Instance details

Defined in Text.Internal.CssCommon

Ord PercentageSize 
Instance details

Defined in Text.Internal.CssCommon

Ord PixelSize 
Instance details

Defined in Text.Internal.CssCommon

Ord VarType 
Instance details

Defined in Text.Shakespeare

Ord Deref 
Instance details

Defined in Text.Shakespeare.Base

Methods

compare :: Deref -> Deref -> Ordering #

(<) :: Deref -> Deref -> Bool #

(<=) :: Deref -> Deref -> Bool #

(>) :: Deref -> Deref -> Bool #

(>=) :: Deref -> Deref -> Bool #

max :: Deref -> Deref -> Deref #

min :: Deref -> Deref -> Deref #

Ord Ident 
Instance details

Defined in Text.Shakespeare.Base

Methods

compare :: Ident -> Ident -> Ordering #

(<) :: Ident -> Ident -> Bool #

(<=) :: Ident -> Ident -> Bool #

(>) :: Ident -> Ident -> Bool #

(>=) :: Ident -> Ident -> Bool #

max :: Ident -> Ident -> Ident #

min :: Ident -> Ident -> Ident #

Ord HostPreference 
Instance details

Defined in Data.Streaming.Network.Internal

Ord Leniency 
Instance details

Defined in Data.String.Conv

Ord AnnLookup 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord AnnTarget 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Bang 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Bang -> Bang -> Ordering #

(<) :: Bang -> Bang -> Bool #

(<=) :: Bang -> Bang -> Bool #

(>) :: Bang -> Bang -> Bool #

(>=) :: Bang -> Bang -> Bool #

max :: Bang -> Bang -> Bang #

min :: Bang -> Bang -> Bang #

Ord Body 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Body -> Body -> Ordering #

(<) :: Body -> Body -> Bool #

(<=) :: Body -> Body -> Bool #

(>) :: Body -> Body -> Bool #

(>=) :: Body -> Body -> Bool #

max :: Body -> Body -> Body #

min :: Body -> Body -> Body #

Ord Bytes 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Bytes -> Bytes -> Ordering #

(<) :: Bytes -> Bytes -> Bool #

(<=) :: Bytes -> Bytes -> Bool #

(>) :: Bytes -> Bytes -> Bool #

(>=) :: Bytes -> Bytes -> Bool #

max :: Bytes -> Bytes -> Bytes #

min :: Bytes -> Bytes -> Bytes #

Ord Callconv 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Clause 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Con 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Con -> Con -> Ordering #

(<) :: Con -> Con -> Bool #

(<=) :: Con -> Con -> Bool #

(>) :: Con -> Con -> Bool #

(>=) :: Con -> Con -> Bool #

max :: Con -> Con -> Con #

min :: Con -> Con -> Con #

Ord Dec 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Dec -> Dec -> Ordering #

(<) :: Dec -> Dec -> Bool #

(<=) :: Dec -> Dec -> Bool #

(>) :: Dec -> Dec -> Bool #

(>=) :: Dec -> Dec -> Bool #

max :: Dec -> Dec -> Dec #

min :: Dec -> Dec -> Dec #

Ord DecidedStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord DerivClause 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord DerivStrategy 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Exp 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Exp -> Exp -> Ordering #

(<) :: Exp -> Exp -> Bool #

(<=) :: Exp -> Exp -> Bool #

(>) :: Exp -> Exp -> Bool #

(>=) :: Exp -> Exp -> Bool #

max :: Exp -> Exp -> Exp #

min :: Exp -> Exp -> Exp #

Ord FamilyResultSig 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Fixity 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord FixityDirection 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Foreign 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord FunDep 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Guard 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Guard -> Guard -> Ordering #

(<) :: Guard -> Guard -> Bool #

(<=) :: Guard -> Guard -> Bool #

(>) :: Guard -> Guard -> Bool #

(>=) :: Guard -> Guard -> Bool #

max :: Guard -> Guard -> Guard #

min :: Guard -> Guard -> Guard #

Ord Info 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Info -> Info -> Ordering #

(<) :: Info -> Info -> Bool #

(<=) :: Info -> Info -> Bool #

(>) :: Info -> Info -> Bool #

(>=) :: Info -> Info -> Bool #

max :: Info -> Info -> Info #

min :: Info -> Info -> Info #

Ord InjectivityAnn 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Inline 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Lit 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Lit -> Lit -> Ordering #

(<) :: Lit -> Lit -> Bool #

(<=) :: Lit -> Lit -> Bool #

(>) :: Lit -> Lit -> Bool #

(>=) :: Lit -> Lit -> Bool #

max :: Lit -> Lit -> Lit #

min :: Lit -> Lit -> Lit #

Ord Loc 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Loc -> Loc -> Ordering #

(<) :: Loc -> Loc -> Bool #

(<=) :: Loc -> Loc -> Bool #

(>) :: Loc -> Loc -> Bool #

(>=) :: Loc -> Loc -> Bool #

max :: Loc -> Loc -> Loc #

min :: Loc -> Loc -> Loc #

Ord Match 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Match -> Match -> Ordering #

(<) :: Match -> Match -> Bool #

(<=) :: Match -> Match -> Bool #

(>) :: Match -> Match -> Bool #

(>=) :: Match -> Match -> Bool #

max :: Match -> Match -> Match #

min :: Match -> Match -> Match #

Ord ModName 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Module 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord ModuleInfo 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Name 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Name -> Name -> Ordering #

(<) :: Name -> Name -> Bool #

(<=) :: Name -> Name -> Bool #

(>) :: Name -> Name -> Bool #

(>=) :: Name -> Name -> Bool #

max :: Name -> Name -> Name #

min :: Name -> Name -> Name #

Ord NameFlavour 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord NameSpace 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord OccName 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Overlap 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Pat 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Pat -> Pat -> Ordering #

(<) :: Pat -> Pat -> Bool #

(<=) :: Pat -> Pat -> Bool #

(>) :: Pat -> Pat -> Bool #

(>=) :: Pat -> Pat -> Bool #

max :: Pat -> Pat -> Pat #

min :: Pat -> Pat -> Pat #

Ord PatSynArgs 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord PatSynDir 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Phases 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord PkgName 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Pragma 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Range 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Range -> Range -> Ordering #

(<) :: Range -> Range -> Bool #

(<=) :: Range -> Range -> Bool #

(>) :: Range -> Range -> Bool #

(>=) :: Range -> Range -> Bool #

max :: Range -> Range -> Range #

min :: Range -> Range -> Range #

Ord Role 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Role -> Role -> Ordering #

(<) :: Role -> Role -> Bool #

(<=) :: Role -> Role -> Bool #

(>) :: Role -> Role -> Bool #

(>=) :: Role -> Role -> Bool #

max :: Role -> Role -> Role #

min :: Role -> Role -> Role #

Ord RuleBndr 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord RuleMatch 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Safety 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord SourceStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord SourceUnpackedness 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Specificity 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Stmt 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Stmt -> Stmt -> Ordering #

(<) :: Stmt -> Stmt -> Bool #

(<=) :: Stmt -> Stmt -> Bool #

(>) :: Stmt -> Stmt -> Bool #

(>=) :: Stmt -> Stmt -> Bool #

max :: Stmt -> Stmt -> Stmt #

min :: Stmt -> Stmt -> Stmt #

Ord TyLit 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: TyLit -> TyLit -> Ordering #

(<) :: TyLit -> TyLit -> Bool #

(<=) :: TyLit -> TyLit -> Bool #

(>) :: TyLit -> TyLit -> Bool #

(>=) :: TyLit -> TyLit -> Bool #

max :: TyLit -> TyLit -> TyLit #

min :: TyLit -> TyLit -> TyLit #

Ord TySynEqn 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Type 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Type -> Type -> Ordering #

(<) :: Type -> Type -> Bool #

(<=) :: Type -> Type -> Bool #

(>) :: Type -> Type -> Bool #

(>=) :: Type -> Type -> Bool #

max :: Type -> Type -> Type #

min :: Type -> Type -> Type #

Ord TypeFamilyHead 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Builder 
Instance details

Defined in Data.Text.Internal.Builder

Ord B 
Instance details

Defined in Data.Text.Short.Internal

Methods

compare :: B -> B -> Ordering #

(<) :: B -> B -> Bool #

(<=) :: B -> B -> Bool #

(>) :: B -> B -> Bool #

(>=) :: B -> B -> Bool #

max :: B -> B -> B #

min :: B -> B -> B #

Ord ShortText 
Instance details

Defined in Data.Text.Short.Internal

Ord ConstructorVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Ord DatatypeVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Ord FieldStrictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Ord Strictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Ord Unpackedness 
Instance details

Defined in Language.Haskell.TH.Datatype

Ord Day 
Instance details

Defined in Data.Time.Calendar.Days

Methods

compare :: Day -> Day -> Ordering #

(<) :: Day -> Day -> Bool #

(<=) :: Day -> Day -> Bool #

(>) :: Day -> Day -> Bool #

(>=) :: Day -> Day -> Bool #

max :: Day -> Day -> Day #

min :: Day -> Day -> Day #

Ord DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Ord NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Ord UTCTime 
Instance details

Defined in Data.Time.Clock.Internal.UTCTime

Ord TimeLocale 
Instance details

Defined in Data.Time.Format.Locale

Ord LocalTime 
Instance details

Defined in Data.Time.LocalTime.Internal.LocalTime

Ord TimeOfDay 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeOfDay

Ord Undefined 
Instance details

Defined in Universum.Debug

Ord ConcException 
Instance details

Defined in UnliftIO.Internals.Async

Ord UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

compare :: UUID -> UUID -> Ordering #

(<) :: UUID -> UUID -> Bool #

(<=) :: UUID -> UUID -> Bool #

(>) :: UUID -> UUID -> Bool #

(>=) :: UUID -> UUID -> Bool #

max :: UUID -> UUID -> UUID #

min :: UUID -> UUID -> UUID #

Ord UnpackedUUID 
Instance details

Defined in Data.UUID.Types.Internal

Ord Piece 
Instance details

Defined in WaiAppStatic.Types

Methods

compare :: Piece -> Piece -> Ordering #

(<) :: Piece -> Piece -> Bool #

(<=) :: Piece -> Piece -> Bool #

(>) :: Piece -> Piece -> Bool #

(>=) :: Piece -> Piece -> Bool #

max :: Piece -> Piece -> Piece #

min :: Piece -> Piece -> Piece #

Ord PushPromise 
Instance details

Defined in Network.Wai.Handler.Warp.HTTP2.Types

Ord Int128 
Instance details

Defined in Data.WideWord.Int128

Ord Word128 
Instance details

Defined in Data.WideWord.Word128

Ord Word256 
Instance details

Defined in Data.WideWord.Word256

Ord Content 
Instance details

Defined in Data.XML.Types

Ord Doctype 
Instance details

Defined in Data.XML.Types

Ord Document 
Instance details

Defined in Data.XML.Types

Ord Element 
Instance details

Defined in Data.XML.Types

Ord Event 
Instance details

Defined in Data.XML.Types

Methods

compare :: Event -> Event -> Ordering #

(<) :: Event -> Event -> Bool #

(<=) :: Event -> Event -> Bool #

(>) :: Event -> Event -> Bool #

(>=) :: Event -> Event -> Bool #

max :: Event -> Event -> Event #

min :: Event -> Event -> Event #

Ord ExternalID 
Instance details

Defined in Data.XML.Types

Ord Instruction 
Instance details

Defined in Data.XML.Types

Ord Miscellaneous 
Instance details

Defined in Data.XML.Types

Ord Name 
Instance details

Defined in Data.XML.Types

Methods

compare :: Name -> Name -> Ordering #

(<) :: Name -> Name -> Bool #

(<=) :: Name -> Name -> Bool #

(>) :: Name -> Name -> Bool #

(>=) :: Name -> Name -> Bool #

max :: Name -> Name -> Name #

min :: Name -> Name -> Name #

Ord Node 
Instance details

Defined in Data.XML.Types

Methods

compare :: Node -> Node -> Ordering #

(<) :: Node -> Node -> Bool #

(<=) :: Node -> Node -> Bool #

(>) :: Node -> Node -> Bool #

(>=) :: Node -> Node -> Bool #

max :: Node -> Node -> Node #

min :: Node -> Node -> Node #

Ord Prologue 
Instance details

Defined in Data.XML.Types

Ord BootstrapGridOptions 
Instance details

Defined in Yesod.Form.Bootstrap3

Ord Textarea 
Instance details

Defined in Yesod.Form.Fields

Ord CompressionStrategy 
Instance details

Defined in Codec.Compression.Zlib.Stream

Ord DictionaryHash 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

compare :: DictionaryHash -> DictionaryHash -> Ordering #

(<) :: DictionaryHash -> DictionaryHash -> Bool #

(<=) :: DictionaryHash -> DictionaryHash -> Bool #

(>) :: DictionaryHash -> DictionaryHash -> Bool #

(>=) :: DictionaryHash -> DictionaryHash -> Bool #

max :: DictionaryHash -> DictionaryHash -> DictionaryHash #

min :: DictionaryHash -> DictionaryHash -> DictionaryHash #

Ord Format 
Instance details

Defined in Codec.Compression.Zlib.Stream

Ord Method 
Instance details

Defined in Codec.Compression.Zlib.Stream

Ord WindowBits 
Instance details

Defined in Codec.Compression.Zlib.Stream

Ord 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 Integer 
Instance details

Defined in GHC.Num.Integer

Ord Natural 
Instance details

Defined in GHC.Num.Natural

Ord () 
Instance details

Defined in GHC.Classes

Methods

compare :: () -> () -> Ordering #

(<) :: () -> () -> Bool #

(<=) :: () -> () -> Bool #

(>) :: () -> () -> Bool #

(>=) :: () -> () -> Bool #

max :: () -> () -> () #

min :: () -> () -> () #

Ord Bool 
Instance details

Defined in GHC.Classes

Methods

compare :: Bool -> Bool -> Ordering #

(<) :: Bool -> Bool -> Bool #

(<=) :: Bool -> Bool -> Bool #

(>) :: Bool -> Bool -> Bool #

(>=) :: Bool -> Bool -> Bool #

max :: Bool -> Bool -> Bool #

min :: Bool -> Bool -> Bool #

Ord Char 
Instance details

Defined in GHC.Classes

Methods

compare :: Char -> Char -> Ordering #

(<) :: Char -> Char -> Bool #

(<=) :: Char -> Char -> Bool #

(>) :: Char -> Char -> Bool #

(>=) :: Char -> Char -> Bool #

max :: Char -> Char -> Char #

min :: Char -> Char -> Char #

Ord Double

Note that due to the presence of NaN, Double's Ord instance does not satisfy reflexivity.

>>> 0/0 <= (0/0 :: Double)
False

Also note that, due to the same, Ord's operator interactions are not respected by Double's instance:

>>> (0/0 :: Double) > 1
False
>>> compare (0/0 :: Double) 1
GT
Instance details

Defined in GHC.Classes

Ord Float

Note that due to the presence of NaN, Float's Ord instance does not satisfy reflexivity.

>>> 0/0 <= (0/0 :: Float)
False

Also note that, due to the same, Ord's operator interactions are not respected by Float's instance:

>>> (0/0 :: Float) > 1
False
>>> compare (0/0 :: Float) 1
GT
Instance details

Defined in GHC.Classes

Methods

compare :: Float -> Float -> Ordering #

(<) :: Float -> Float -> Bool #

(<=) :: Float -> Float -> Bool #

(>) :: Float -> Float -> Bool #

(>=) :: Float -> Float -> Bool #

max :: Float -> Float -> Float #

min :: Float -> Float -> Float #

Ord Int 
Instance details

Defined in GHC.Classes

Methods

compare :: Int -> Int -> Ordering #

(<) :: Int -> Int -> Bool #

(<=) :: Int -> Int -> Bool #

(>) :: Int -> Int -> Bool #

(>=) :: Int -> Int -> Bool #

max :: Int -> Int -> Int #

min :: Int -> Int -> Int #

Ord Word 
Instance details

Defined in GHC.Classes

Methods

compare :: Word -> Word -> Ordering #

(<) :: Word -> Word -> Bool #

(<=) :: Word -> Word -> Bool #

(>) :: Word -> Word -> Bool #

(>=) :: Word -> Word -> Bool #

max :: Word -> Word -> Word #

min :: Word -> Word -> Word #

Ord a => Ord (Only a) 
Instance details

Defined in Data.Tuple.Only

Methods

compare :: Only a -> Only a -> Ordering #

(<) :: Only a -> Only a -> Bool #

(<=) :: Only a -> Only a -> Bool #

(>) :: Only a -> Only a -> Bool #

(>=) :: Only a -> Only a -> Bool #

max :: Only a -> Only a -> Only a #

min :: Only a -> Only a -> Only a #

Ord (Digest t) 
Instance details

Defined in Data.Digest.Pure.SHA

Methods

compare :: Digest t -> Digest t -> Ordering #

(<) :: Digest t -> Digest t -> Bool #

(<=) :: Digest t -> Digest t -> Bool #

(>) :: Digest t -> Digest t -> Bool #

(>=) :: Digest t -> Digest t -> Bool #

max :: Digest t -> Digest t -> Digest t #

min :: Digest t -> Digest t -> Digest t #

Ord (Encoding' a) 
Instance details

Defined in Data.Aeson.Encoding.Internal

Ord (Async a) 
Instance details

Defined in Control.Concurrent.Async

Methods

compare :: Async a -> Async a -> Ordering #

(<) :: Async a -> Async a -> Bool #

(<=) :: Async a -> Async a -> Bool #

(>) :: Async a -> Async a -> Bool #

(>=) :: Async a -> Async a -> Bool #

max :: Async a -> Async a -> Async a #

min :: Async a -> Async a -> Async a #

Ord a => Ord (ZipList a)

Since: base-4.7.0.0

Instance details

Defined in Control.Applicative

Methods

compare :: ZipList a -> ZipList a -> Ordering #

(<) :: ZipList a -> ZipList a -> Bool #

(<=) :: ZipList a -> ZipList a -> Bool #

(>) :: ZipList a -> ZipList a -> Bool #

(>=) :: ZipList a -> ZipList a -> Bool #

max :: ZipList a -> ZipList a -> ZipList a #

min :: ZipList a -> ZipList a -> ZipList a #

Ord a => Ord (Identity a)

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

compare :: Identity a -> Identity a -> Ordering #

(<) :: Identity a -> Identity a -> Bool #

(<=) :: Identity a -> Identity a -> Bool #

(>) :: Identity a -> Identity a -> Bool #

(>=) :: Identity a -> Identity a -> Bool #

max :: Identity a -> Identity a -> Identity a #

min :: Identity a -> Identity a -> Identity a #

Ord a => Ord (First a)

Since: base-2.1

Instance details

Defined in Data.Monoid

Methods

compare :: First a -> First a -> Ordering #

(<) :: First a -> First a -> Bool #

(<=) :: First a -> First a -> Bool #

(>) :: First a -> First a -> Bool #

(>=) :: First a -> First a -> Bool #

max :: First a -> First a -> First a #

min :: First a -> First a -> First a #

Ord a => Ord (Last a)

Since: base-2.1

Instance details

Defined in Data.Monoid

Methods

compare :: Last a -> Last a -> Ordering #

(<) :: Last a -> Last a -> Bool #

(<=) :: Last a -> Last a -> Bool #

(>) :: Last a -> Last a -> Bool #

(>=) :: Last a -> Last a -> Bool #

max :: Last a -> Last a -> Last a #

min :: Last a -> Last a -> Last a #

Ord a => Ord (Down a)

Since: base-4.6.0.0

Instance details

Defined in Data.Ord

Methods

compare :: Down a -> Down a -> Ordering #

(<) :: Down a -> Down a -> Bool #

(<=) :: Down a -> Down a -> Bool #

(>) :: Down a -> Down a -> Bool #

(>=) :: Down a -> Down a -> Bool #

max :: Down a -> Down a -> Down a #

min :: Down a -> Down a -> Down a #

Ord a => Ord (First a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

compare :: First a -> First a -> Ordering #

(<) :: First a -> First a -> Bool #

(<=) :: First a -> First a -> Bool #

(>) :: First a -> First a -> Bool #

(>=) :: First a -> First a -> Bool #

max :: First a -> First a -> First a #

min :: First a -> First a -> First a #

Ord a => Ord (Last a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

compare :: Last a -> Last a -> Ordering #

(<) :: Last a -> Last a -> Bool #

(<=) :: Last a -> Last a -> Bool #

(>) :: Last a -> Last a -> Bool #

(>=) :: Last a -> Last a -> Bool #

max :: Last a -> Last a -> Last a #

min :: Last a -> Last a -> Last a #

Ord a => Ord (Max a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

compare :: Max a -> Max a -> Ordering #

(<) :: Max a -> Max a -> Bool #

(<=) :: Max a -> Max a -> Bool #

(>) :: Max a -> Max a -> Bool #

(>=) :: Max a -> Max a -> Bool #

max :: Max a -> Max a -> Max a #

min :: Max a -> Max a -> Max a #

Ord a => Ord (Min a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

compare :: Min a -> Min a -> Ordering #

(<) :: Min a -> Min a -> Bool #

(<=) :: Min a -> Min a -> Bool #

(>) :: Min a -> Min a -> Bool #

(>=) :: Min a -> Min a -> Bool #

max :: Min a -> Min a -> Min a #

min :: Min a -> Min a -> Min a #

Ord 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 m => Ord (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Ord a => Ord (Dual a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

compare :: Dual a -> Dual a -> Ordering #

(<) :: Dual a -> Dual a -> Bool #

(<=) :: Dual a -> Dual a -> Bool #

(>) :: Dual a -> Dual a -> Bool #

(>=) :: Dual a -> Dual a -> Bool #

max :: Dual a -> Dual a -> Dual a #

min :: Dual a -> Dual a -> Dual a #

Ord a => Ord (Product a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

compare :: Product a -> Product a -> Ordering #

(<) :: Product a -> Product a -> Bool #

(<=) :: Product a -> Product a -> Bool #

(>) :: Product a -> Product a -> Bool #

(>=) :: Product a -> Product a -> Bool #

max :: Product a -> Product a -> Product a #

min :: Product a -> Product a -> Product a #

Ord a => Ord (Sum a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

compare :: Sum a -> Sum a -> Ordering #

(<) :: Sum a -> Sum a -> Bool #

(<=) :: Sum a -> Sum a -> Bool #

(>) :: Sum a -> Sum a -> Bool #

(>=) :: Sum a -> Sum a -> Bool #

max :: Sum a -> Sum a -> Sum a #

min :: Sum a -> Sum a -> Sum a #

Ord 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 (ForeignPtr a)

Since: base-2.1

Instance details

Defined in GHC.ForeignPtr

Ord p => Ord (Par1 p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: Par1 p -> Par1 p -> Ordering #

(<) :: Par1 p -> Par1 p -> Bool #

(<=) :: Par1 p -> Par1 p -> Bool #

(>) :: Par1 p -> Par1 p -> Bool #

(>=) :: Par1 p -> Par1 p -> Bool #

max :: Par1 p -> Par1 p -> Par1 p #

min :: Par1 p -> Par1 p -> Par1 p #

Ord (FunPtr a) 
Instance details

Defined in GHC.Ptr

Methods

compare :: FunPtr a -> FunPtr a -> Ordering #

(<) :: FunPtr a -> FunPtr a -> Bool #

(<=) :: FunPtr a -> FunPtr a -> Bool #

(>) :: FunPtr a -> FunPtr a -> Bool #

(>=) :: FunPtr a -> FunPtr a -> Bool #

max :: FunPtr a -> FunPtr a -> FunPtr a #

min :: FunPtr a -> FunPtr a -> FunPtr a #

Ord (Ptr a)

Since: base-2.1

Instance details

Defined in GHC.Ptr

Methods

compare :: Ptr a -> Ptr a -> Ordering #

(<) :: Ptr a -> Ptr a -> Bool #

(<=) :: Ptr a -> Ptr a -> Bool #

(>) :: Ptr a -> Ptr a -> Bool #

(>=) :: Ptr a -> Ptr a -> Bool #

max :: Ptr a -> Ptr a -> Ptr a #

min :: Ptr a -> Ptr a -> Ptr a #

Integral a => Ord (Ratio a)

Since: base-2.0.1

Instance details

Defined in GHC.Real

Methods

compare :: Ratio a -> Ratio a -> Ordering #

(<) :: Ratio a -> Ratio a -> Bool #

(<=) :: Ratio a -> Ratio a -> Bool #

(>) :: Ratio a -> Ratio a -> Bool #

(>=) :: Ratio a -> Ratio a -> Bool #

max :: Ratio a -> Ratio a -> Ratio a #

min :: Ratio a -> Ratio a -> Ratio a #

Ord (Bits n) 
Instance details

Defined in Basement.Bits

Methods

compare :: Bits n -> Bits n -> Ordering #

(<) :: Bits n -> Bits n -> Bool #

(<=) :: Bits n -> Bits n -> Bool #

(>) :: Bits n -> Bits n -> Bool #

(>=) :: Bits n -> Bits n -> Bool #

max :: Bits n -> Bits n -> Bits n #

min :: Bits n -> Bits n -> Bits n #

(PrimType ty, Ord ty) => Ord (Block ty) 
Instance details

Defined in Basement.Block.Base

Methods

compare :: Block ty -> Block ty -> Ordering #

(<) :: Block ty -> Block ty -> Bool #

(<=) :: Block ty -> Block ty -> Bool #

(>) :: Block ty -> Block ty -> Bool #

(>=) :: Block ty -> Block ty -> Bool #

max :: Block ty -> Block ty -> Block ty #

min :: Block ty -> Block ty -> Block ty #

Ord (Zn n) 
Instance details

Defined in Basement.Bounded

Methods

compare :: Zn n -> Zn n -> Ordering #

(<) :: Zn n -> Zn n -> Bool #

(<=) :: Zn n -> Zn n -> Bool #

(>) :: Zn n -> Zn n -> Bool #

(>=) :: Zn n -> Zn n -> Bool #

max :: Zn n -> Zn n -> Zn n #

min :: Zn n -> Zn n -> Zn n #

Ord (Zn64 n) 
Instance details

Defined in Basement.Bounded

Methods

compare :: Zn64 n -> Zn64 n -> Ordering #

(<) :: Zn64 n -> Zn64 n -> Bool #

(<=) :: Zn64 n -> Zn64 n -> Bool #

(>) :: Zn64 n -> Zn64 n -> Bool #

(>=) :: Zn64 n -> Zn64 n -> Bool #

max :: Zn64 n -> Zn64 n -> Zn64 n #

min :: Zn64 n -> Zn64 n -> Zn64 n #

Ord (CountOf ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

compare :: CountOf ty -> CountOf ty -> Ordering #

(<) :: CountOf ty -> CountOf ty -> Bool #

(<=) :: CountOf ty -> CountOf ty -> Bool #

(>) :: CountOf ty -> CountOf ty -> Bool #

(>=) :: CountOf ty -> CountOf ty -> Bool #

max :: CountOf ty -> CountOf ty -> CountOf ty #

min :: CountOf ty -> CountOf ty -> CountOf ty #

Ord (Offset ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

compare :: Offset ty -> Offset ty -> Ordering #

(<) :: Offset ty -> Offset ty -> Bool #

(<=) :: Offset ty -> Offset ty -> Bool #

(>) :: Offset ty -> Offset ty -> Bool #

(>=) :: Offset ty -> Offset ty -> Bool #

max :: Offset ty -> Offset ty -> Offset ty #

min :: Offset ty -> Offset ty -> Offset ty #

(PrimType ty, Ord ty) => Ord (UArray ty) 
Instance details

Defined in Basement.UArray.Base

Methods

compare :: UArray ty -> UArray ty -> Ordering #

(<) :: UArray ty -> UArray ty -> Bool #

(<=) :: UArray ty -> UArray ty -> Bool #

(>) :: UArray ty -> UArray ty -> Bool #

(>=) :: UArray ty -> UArray ty -> Bool #

max :: UArray ty -> UArray ty -> UArray ty #

min :: UArray ty -> UArray ty -> UArray ty #

Ord (OnChainAddress mrel) Source # 
Instance details

Defined in BtcLsp.Data.Smart

Ord (Liquidity dir) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

compare :: Liquidity dir -> Liquidity dir -> Ordering #

(<) :: Liquidity dir -> Liquidity dir -> Bool #

(<=) :: Liquidity dir -> Liquidity dir -> Bool #

(>) :: Liquidity dir -> Liquidity dir -> Bool #

(>=) :: Liquidity dir -> Liquidity dir -> Bool #

max :: Liquidity dir -> Liquidity dir -> Liquidity dir #

min :: Liquidity dir -> Liquidity dir -> Liquidity dir #

Ord (UnsafeOnChainAddress mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Ord (Uuid tab) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

compare :: Uuid tab -> Uuid tab -> Ordering #

(<) :: Uuid tab -> Uuid tab -> Bool #

(<=) :: Uuid tab -> Uuid tab -> Bool #

(>) :: Uuid tab -> Uuid tab -> Bool #

(>=) :: Uuid tab -> Uuid tab -> Bool #

max :: Uuid tab -> Uuid tab -> Uuid tab #

min :: Uuid tab -> Uuid tab -> Uuid tab #

Ord (TlsCert rel) Source # 
Instance details

Defined in BtcLsp.Grpc.Data

Methods

compare :: TlsCert rel -> TlsCert rel -> Ordering #

(<) :: TlsCert rel -> TlsCert rel -> Bool #

(<=) :: TlsCert rel -> TlsCert rel -> Bool #

(>) :: TlsCert rel -> TlsCert rel -> Bool #

(>=) :: TlsCert rel -> TlsCert rel -> Bool #

max :: TlsCert rel -> TlsCert rel -> TlsCert rel #

min :: TlsCert rel -> TlsCert rel -> TlsCert rel #

Ord (TlsData rel) Source # 
Instance details

Defined in BtcLsp.Grpc.Data

Methods

compare :: TlsData rel -> TlsData rel -> Ordering #

(<) :: TlsData rel -> TlsData rel -> Bool #

(<=) :: TlsData rel -> TlsData rel -> Bool #

(>) :: TlsData rel -> TlsData rel -> Bool #

(>=) :: TlsData rel -> TlsData rel -> Bool #

max :: TlsData rel -> TlsData rel -> TlsData rel #

min :: TlsData rel -> TlsData rel -> TlsData rel #

Ord (TlsKey rel) Source # 
Instance details

Defined in BtcLsp.Grpc.Data

Methods

compare :: TlsKey rel -> TlsKey rel -> Ordering #

(<) :: TlsKey rel -> TlsKey rel -> Bool #

(<=) :: TlsKey rel -> TlsKey rel -> Bool #

(>) :: TlsKey rel -> TlsKey rel -> Bool #

(>=) :: TlsKey rel -> TlsKey rel -> Bool #

max :: TlsKey rel -> TlsKey rel -> TlsKey rel #

min :: TlsKey rel -> TlsKey rel -> TlsKey rel #

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 #

Ord a => Ord (MeridiemLocale a) 
Instance details

Defined in Chronos

Ord a => Ord (Flush a) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

compare :: Flush a -> Flush a -> Ordering #

(<) :: Flush a -> Flush a -> Bool #

(<=) :: Flush a -> Flush a -> Bool #

(>) :: Flush a -> Flush a -> Bool #

(>=) :: Flush a -> Flush a -> Bool #

max :: Flush a -> Flush a -> Flush a #

min :: Flush a -> Flush a -> Flush a #

Ord a => Ord (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

compare :: IntMap a -> IntMap a -> Ordering #

(<) :: IntMap a -> IntMap a -> Bool #

(<=) :: IntMap a -> IntMap a -> Bool #

(>) :: IntMap a -> IntMap a -> Bool #

(>=) :: IntMap a -> IntMap a -> Bool #

max :: IntMap a -> IntMap a -> IntMap a #

min :: IntMap a -> IntMap a -> IntMap a #

Ord a => Ord (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

compare :: Seq a -> Seq a -> Ordering #

(<) :: Seq a -> Seq a -> Bool #

(<=) :: Seq a -> Seq a -> Bool #

(>) :: Seq a -> Seq a -> Bool #

(>=) :: Seq a -> Seq a -> Bool #

max :: Seq a -> Seq a -> Seq a #

min :: Seq a -> Seq a -> Seq a #

Ord a => Ord (ViewL a) 
Instance details

Defined in Data.Sequence.Internal

Methods

compare :: ViewL a -> ViewL a -> Ordering #

(<) :: ViewL a -> ViewL a -> Bool #

(<=) :: ViewL a -> ViewL a -> Bool #

(>) :: ViewL a -> ViewL a -> Bool #

(>=) :: ViewL a -> ViewL a -> Bool #

max :: ViewL a -> ViewL a -> ViewL a #

min :: ViewL a -> ViewL a -> ViewL a #

Ord a => Ord (ViewR a) 
Instance details

Defined in Data.Sequence.Internal

Methods

compare :: ViewR a -> ViewR a -> Ordering #

(<) :: ViewR a -> ViewR a -> Bool #

(<=) :: ViewR a -> ViewR a -> Bool #

(>) :: ViewR a -> ViewR a -> Bool #

(>=) :: ViewR a -> ViewR a -> Bool #

max :: ViewR a -> ViewR a -> ViewR a #

min :: ViewR a -> ViewR a -> ViewR a #

Ord a => Ord (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

compare :: Set a -> Set a -> Ordering #

(<) :: Set a -> Set a -> Bool #

(<=) :: Set a -> Set a -> Bool #

(>) :: Set a -> Set a -> Bool #

(>=) :: Set a -> Set a -> Bool #

max :: Set a -> Set a -> Set a #

min :: Set a -> Set a -> Set a #

Ord (Digest a) 
Instance details

Defined in Crypto.Hash.Types

Methods

compare :: Digest a -> Digest a -> Ordering #

(<) :: Digest a -> Digest a -> Bool #

(<=) :: Digest a -> Digest a -> Bool #

(>) :: Digest a -> Digest a -> Bool #

(>=) :: Digest a -> Digest a -> Bool #

max :: Digest a -> Digest a -> Digest a #

min :: Digest a -> Digest a -> Digest a #

Ord1 f => Ord (Fix f) 
Instance details

Defined in Data.Fix

Methods

compare :: Fix f -> Fix f -> Ordering #

(<) :: Fix f -> Fix f -> Bool #

(<=) :: Fix f -> Fix f -> Bool #

(>) :: Fix f -> Fix f -> Bool #

(>=) :: Fix f -> Fix f -> Bool #

max :: Fix f -> Fix f -> Fix f #

min :: Fix f -> Fix f -> Fix f #

(Functor f, Ord1 f) => Ord (Mu f) 
Instance details

Defined in Data.Fix

Methods

compare :: Mu f -> Mu f -> Ordering #

(<) :: Mu f -> Mu f -> Bool #

(<=) :: Mu f -> Mu f -> Bool #

(>) :: Mu f -> Mu f -> Bool #

(>=) :: Mu f -> Mu f -> Bool #

max :: Mu f -> Mu f -> Mu f #

min :: Mu f -> Mu f -> Mu f #

(Functor f, Ord1 f) => Ord (Nu f) 
Instance details

Defined in Data.Fix

Methods

compare :: Nu f -> Nu f -> Ordering #

(<) :: Nu f -> Nu f -> Bool #

(<=) :: Nu f -> Nu f -> Bool #

(>) :: Nu f -> Nu f -> Bool #

(>=) :: Nu f -> Nu f -> Bool #

max :: Nu f -> Nu f -> Nu f #

min :: Nu f -> Nu f -> Nu f #

Ord a => Ord (DNonEmpty a) 
Instance details

Defined in Data.DList.DNonEmpty.Internal

Ord a => Ord (DList a) 
Instance details

Defined in Data.DList.Internal

Methods

compare :: DList a -> DList a -> Ordering #

(<) :: DList a -> DList a -> Bool #

(<=) :: DList a -> DList a -> Bool #

(>) :: DList a -> DList a -> Bool #

(>=) :: DList a -> DList a -> Bool #

max :: DList a -> DList a -> DList a #

min :: DList a -> DList a -> DList a #

Ord a => Ord (Value a) 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Methods

compare :: Value a -> Value a -> Ordering #

(<) :: Value a -> Value a -> Bool #

(<=) :: Value a -> Value a -> Bool #

(>) :: Value a -> Value a -> Bool #

(>=) :: Value a -> Value a -> Bool #

max :: Value a -> Value a -> Value a #

min :: Value a -> Value a -> Value a #

Ord a => Ord (ValueList a) 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Ord a => Ord (PrettyLog a) 
Instance details

Defined in Text.PrettyPrint.GenericPretty.Type

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 (LenientData a) 
Instance details

Defined in Web.Internal.HttpApiData

Ord a => Ord (AddrRange a) 
Instance details

Defined in Data.IP.Range

Ord (PendingUpdate a) 
Instance details

Defined in LndClient.Data.Channel

Methods

compare :: PendingUpdate a -> PendingUpdate a -> Ordering #

(<) :: PendingUpdate a -> PendingUpdate a -> Bool #

(<=) :: PendingUpdate a -> PendingUpdate a -> Bool #

(>) :: PendingUpdate a -> PendingUpdate a -> Bool #

(>=) :: PendingUpdate a -> PendingUpdate a -> Bool #

max :: PendingUpdate a -> PendingUpdate a -> PendingUpdate a #

min :: PendingUpdate a -> PendingUpdate a -> PendingUpdate a #

Ord (TxId a) 
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) 
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 mono => Ord (NonNull mono) 
Instance details

Defined in Data.NonNull

Methods

compare :: NonNull mono -> NonNull mono -> Ordering #

(<) :: NonNull mono -> NonNull mono -> Bool #

(<=) :: NonNull mono -> NonNull mono -> Bool #

(>) :: NonNull mono -> NonNull mono -> Bool #

(>=) :: NonNull mono -> NonNull mono -> Bool #

max :: NonNull mono -> NonNull mono -> NonNull mono #

min :: NonNull mono -> NonNull mono -> NonNull mono #

Ord 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 (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 (Key Block) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Ord (Key LnChan) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Ord (Key SwapIntoLn) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Ord (Key SwapUtxo) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Ord (Key User) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Methods

compare :: Key User -> Key User -> Ordering #

(<) :: Key User -> Key User -> Bool #

(<=) :: Key User -> Key User -> Bool #

(>) :: Key User -> Key User -> Bool #

(>=) :: Key User -> Key User -> Bool #

max :: Key User -> Key User -> Key User #

min :: Key User -> Key User -> Key User #

(BackendCompatible b s, Ord (BackendKey b)) => Ord (BackendKey (Compatible b s)) 
Instance details

Defined in Database.Persist.Compatible.Types

(PersistCore b, PersistCore (RawPostgresql b), Ord (BackendKey b)) => Ord (BackendKey (RawPostgresql b)) 
Instance details

Defined in Database.Persist.Postgresql

Ord a => Ord (Single a) 
Instance details

Defined in Database.Persist.Sql.Types

Methods

compare :: Single a -> Single a -> Ordering #

(<) :: Single a -> Single a -> Bool #

(<=) :: Single a -> Single a -> Bool #

(>) :: Single a -> Single a -> Bool #

(>=) :: Single a -> Single a -> Bool #

max :: Single a -> Single a -> Single a #

min :: Single a -> Single a -> Single a #

Ord ann => Ord (SimpleDocStream ann) 
Instance details

Defined in Prettyprinter.Internal

Ord a => Ord (Array a)

Lexicographic ordering. Subject to change between major versions.

Instance details

Defined in Data.Primitive.Array

Methods

compare :: Array a -> Array a -> Ordering #

(<) :: Array a -> Array a -> Bool #

(<=) :: Array a -> Array a -> Bool #

(>) :: Array a -> Array a -> Bool #

(>=) :: Array a -> Array a -> Bool #

max :: Array a -> Array a -> Array a #

min :: Array a -> Array a -> Array a #

(Ord a, Prim a) => Ord (PrimArray a)

Lexicographic ordering. Subject to change between major versions.

Since: primitive-0.6.4.0

Instance details

Defined in Data.Primitive.PrimArray

Ord a => Ord (SmallArray a)

Lexicographic ordering. Subject to change between major versions.

Instance details

Defined in Data.Primitive.SmallArray

Ord 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 g => Ord (StateGen g) 
Instance details

Defined in System.Random.Internal

Methods

compare :: StateGen g -> StateGen g -> Ordering #

(<) :: StateGen g -> StateGen g -> Bool #

(<=) :: StateGen g -> StateGen g -> Bool #

(>) :: StateGen g -> StateGen g -> Bool #

(>=) :: StateGen g -> StateGen g -> Bool #

max :: StateGen g -> StateGen g -> StateGen g #

min :: StateGen g -> StateGen g -> StateGen g #

Ord g => Ord (AtomicGen g) 
Instance details

Defined in System.Random.Stateful

Ord g => Ord (IOGen g) 
Instance details

Defined in System.Random.Stateful

Methods

compare :: IOGen g -> IOGen g -> Ordering #

(<) :: IOGen g -> IOGen g -> Bool #

(<=) :: IOGen g -> IOGen g -> Bool #

(>) :: IOGen g -> IOGen g -> Bool #

(>=) :: IOGen g -> IOGen g -> Bool #

max :: IOGen g -> IOGen g -> IOGen g #

min :: IOGen g -> IOGen g -> IOGen g #

Ord g => Ord (STGen g) 
Instance details

Defined in System.Random.Stateful

Methods

compare :: STGen g -> STGen g -> Ordering #

(<) :: STGen g -> STGen g -> Bool #

(<=) :: STGen g -> STGen g -> Bool #

(>) :: STGen g -> STGen g -> Bool #

(>=) :: STGen g -> STGen g -> Bool #

max :: STGen g -> STGen g -> STGen g #

min :: STGen g -> STGen g -> STGen g #

Ord g => Ord (TGen g) 
Instance details

Defined in System.Random.Stateful

Methods

compare :: TGen g -> TGen g -> Ordering #

(<) :: TGen g -> TGen g -> Bool #

(<=) :: TGen g -> TGen g -> Bool #

(>) :: TGen g -> TGen g -> Bool #

(>=) :: TGen g -> TGen g -> Bool #

max :: TGen g -> TGen g -> TGen g #

min :: TGen g -> TGen g -> TGen g #

Ord a => Ord (Maybe a) 
Instance details

Defined in Data.Strict.Maybe

Methods

compare :: Maybe a -> Maybe a -> Ordering #

(<) :: Maybe a -> Maybe a -> Bool #

(<=) :: Maybe a -> Maybe a -> Bool #

(>) :: Maybe a -> Maybe a -> Bool #

(>=) :: Maybe a -> Maybe a -> Bool #

max :: Maybe a -> Maybe a -> Maybe a #

min :: Maybe a -> Maybe a -> Maybe a #

Ord flag => Ord (TyVarBndr flag) 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: TyVarBndr flag -> TyVarBndr flag -> Ordering #

(<) :: TyVarBndr flag -> TyVarBndr flag -> Bool #

(<=) :: TyVarBndr flag -> TyVarBndr flag -> Bool #

(>) :: TyVarBndr flag -> TyVarBndr flag -> Bool #

(>=) :: TyVarBndr flag -> TyVarBndr flag -> Bool #

max :: TyVarBndr flag -> TyVarBndr flag -> TyVarBndr flag #

min :: TyVarBndr flag -> TyVarBndr flag -> TyVarBndr flag #

Ord a => Ord (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Methods

compare :: HashSet a -> HashSet a -> Ordering #

(<) :: HashSet a -> HashSet a -> Bool #

(<=) :: HashSet a -> HashSet a -> Bool #

(>) :: HashSet a -> HashSet a -> Bool #

(>=) :: HashSet a -> HashSet a -> Bool #

max :: HashSet a -> HashSet a -> HashSet a #

min :: HashSet a -> HashSet a -> HashSet a #

Ord a => Ord (Vector a) 
Instance details

Defined in Data.Vector

Methods

compare :: Vector a -> Vector a -> Ordering #

(<) :: Vector a -> Vector a -> Bool #

(<=) :: Vector a -> Vector a -> Bool #

(>) :: Vector a -> Vector a -> Bool #

(>=) :: Vector a -> Vector a -> Bool #

max :: Vector a -> Vector a -> Vector a #

min :: Vector a -> Vector a -> Vector a #

(Prim a, Ord a) => Ord (Vector a) 
Instance details

Defined in Data.Vector.Primitive

Methods

compare :: Vector a -> Vector a -> Ordering #

(<) :: Vector a -> Vector a -> Bool #

(<=) :: Vector a -> Vector a -> Bool #

(>) :: Vector a -> Vector a -> Bool #

(>=) :: Vector a -> Vector a -> Bool #

max :: Vector a -> Vector a -> Vector a #

min :: Vector a -> Vector a -> Vector a #

(Storable a, Ord a) => Ord (Vector a) 
Instance details

Defined in Data.Vector.Storable

Methods

compare :: Vector a -> Vector a -> Ordering #

(<) :: Vector a -> Vector a -> Bool #

(<=) :: Vector a -> Vector a -> Bool #

(>) :: Vector a -> Vector a -> Bool #

(>=) :: Vector a -> Vector a -> Bool #

max :: Vector a -> Vector a -> Vector a #

min :: Vector a -> Vector a -> Vector a #

Ord (Route LiteApp) 
Instance details

Defined in Yesod.Core.Internal.LiteApp

Ord (Route WaiSubsite) 
Instance details

Defined in Yesod.Core.Types

Ord (Route WaiSubsiteWithAuth) 
Instance details

Defined in Yesod.Core.Types

Ord a => Ord (Maybe a)

Since: base-2.1

Instance details

Defined in GHC.Maybe

Methods

compare :: Maybe a -> Maybe a -> Ordering #

(<) :: Maybe a -> Maybe a -> Bool #

(<=) :: Maybe a -> Maybe a -> Bool #

(>) :: Maybe a -> Maybe a -> Bool #

(>=) :: Maybe a -> Maybe a -> Bool #

max :: Maybe a -> Maybe a -> Maybe a #

min :: Maybe a -> Maybe a -> Maybe a #

Ord a => Ord [a] 
Instance details

Defined in GHC.Classes

Methods

compare :: [a] -> [a] -> Ordering #

(<) :: [a] -> [a] -> Bool #

(<=) :: [a] -> [a] -> Bool #

(>) :: [a] -> [a] -> Bool #

(>=) :: [a] -> [a] -> Bool #

max :: [a] -> [a] -> [a] #

min :: [a] -> [a] -> [a] #

(Ord a, Ord 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 (Fixed a)

Since: base-2.1

Instance details

Defined in Data.Fixed

Methods

compare :: Fixed a -> Fixed a -> Ordering #

(<) :: Fixed a -> Fixed a -> Bool #

(<=) :: Fixed a -> Fixed a -> Bool #

(>) :: Fixed a -> Fixed a -> Bool #

(>=) :: Fixed a -> Fixed a -> Bool #

max :: Fixed a -> Fixed a -> Fixed a #

min :: Fixed a -> Fixed a -> Fixed a #

Ord (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

compare :: Proxy s -> Proxy s -> Ordering #

(<) :: Proxy s -> Proxy s -> Bool #

(<=) :: Proxy s -> Proxy s -> Bool #

(>) :: Proxy s -> Proxy s -> Bool #

(>=) :: Proxy s -> Proxy s -> Bool #

max :: Proxy s -> Proxy s -> Proxy s #

min :: Proxy s -> Proxy s -> Proxy s #

Ord a => Ord (Arg a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

compare :: Arg a b -> Arg a b -> Ordering #

(<) :: Arg a b -> Arg a b -> Bool #

(<=) :: Arg a b -> Arg a b -> Bool #

(>) :: Arg a b -> Arg a b -> Bool #

(>=) :: Arg a b -> Arg a b -> Bool #

max :: Arg a b -> Arg a b -> Arg a b #

min :: Arg a b -> Arg a b -> Arg a b #

Ord (TypeRep a)

Since: base-4.4.0.0

Instance details

Defined in Data.Typeable.Internal

Methods

compare :: TypeRep a -> TypeRep a -> Ordering #

(<) :: TypeRep a -> TypeRep a -> Bool #

(<=) :: TypeRep a -> TypeRep a -> Bool #

(>) :: TypeRep a -> TypeRep a -> Bool #

(>=) :: TypeRep a -> TypeRep a -> Bool #

max :: TypeRep a -> TypeRep a -> TypeRep a #

min :: TypeRep a -> TypeRep a -> TypeRep a #

Ord (U1 p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: U1 p -> U1 p -> Ordering #

(<) :: U1 p -> U1 p -> Bool #

(<=) :: U1 p -> U1 p -> Bool #

(>) :: U1 p -> U1 p -> Bool #

(>=) :: U1 p -> U1 p -> Bool #

max :: U1 p -> U1 p -> U1 p #

min :: U1 p -> U1 p -> U1 p #

Ord (V1 p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: V1 p -> V1 p -> Ordering #

(<) :: V1 p -> V1 p -> Bool #

(<=) :: V1 p -> V1 p -> Bool #

(>) :: V1 p -> V1 p -> Bool #

(>=) :: V1 p -> V1 p -> Bool #

max :: V1 p -> V1 p -> V1 p #

min :: V1 p -> V1 p -> V1 p #

(Ord k, Ord v) => Ord (Map k v) 
Instance details

Defined in Data.Map.Internal

Methods

compare :: Map k v -> Map k v -> Ordering #

(<) :: Map k v -> Map k v -> Bool #

(<=) :: Map k v -> Map k v -> Bool #

(>) :: Map k v -> Map k v -> Bool #

(>=) :: Map k v -> Map k v -> Bool #

max :: Map k v -> Map k v -> Map k v #

min :: Map k v -> Map k v -> Map k v #

(Ord1 f, Ord a) => Ord (Cofree f a) 
Instance details

Defined in Control.Comonad.Cofree

Methods

compare :: Cofree f a -> Cofree f a -> Ordering #

(<) :: Cofree f a -> Cofree f a -> Bool #

(<=) :: Cofree f a -> Cofree f a -> Bool #

(>) :: Cofree f a -> Cofree f a -> Bool #

(>=) :: Cofree f a -> Cofree f a -> Bool #

max :: Cofree f a -> Cofree f a -> Cofree f a #

min :: Cofree f a -> Cofree f a -> Cofree f a #

(Ord1 f, Ord a) => Ord (Free f a) 
Instance details

Defined in Control.Monad.Free

Methods

compare :: Free f a -> Free f a -> Ordering #

(<) :: Free f a -> Free f a -> Bool #

(<=) :: Free f a -> Free f a -> Bool #

(>) :: Free f a -> Free f a -> Bool #

(>=) :: Free f a -> Free f a -> Bool #

max :: Free f a -> Free f a -> Free f a #

min :: Free f a -> Free f a -> Free f a #

(Ord a, Ord b) => Ord (Either a b) 
Instance details

Defined in Data.Strict.Either

Methods

compare :: Either a b -> Either a b -> Ordering #

(<) :: Either a b -> Either a b -> Bool #

(<=) :: Either a b -> Either a b -> Bool #

(>) :: Either a b -> Either a b -> Bool #

(>=) :: Either a b -> Either a b -> Bool #

max :: Either a b -> Either a b -> Either a b #

min :: Either a b -> Either a b -> Either a b #

(Ord a, Ord b) => Ord (These a b) 
Instance details

Defined in Data.Strict.These

Methods

compare :: These a b -> These a b -> Ordering #

(<) :: These a b -> These a b -> Bool #

(<=) :: These a b -> These a b -> Bool #

(>) :: These a b -> These a b -> Bool #

(>=) :: These a b -> These a b -> Bool #

max :: These a b -> These a b -> These a b #

min :: These a b -> These a b -> These a b #

(Ord a, Ord b) => Ord (Pair a b) 
Instance details

Defined in Data.Strict.Tuple

Methods

compare :: Pair a b -> Pair a b -> Ordering #

(<) :: Pair a b -> Pair a b -> Bool #

(<=) :: Pair a b -> Pair a b -> Bool #

(>) :: Pair a b -> Pair a b -> Bool #

(>=) :: Pair a b -> Pair a b -> Bool #

max :: Pair a b -> Pair a b -> Pair a b #

min :: Pair a b -> Pair a b -> Pair a b #

(Ord a, Ord b) => Ord (These a b) 
Instance details

Defined in Data.These

Methods

compare :: These a b -> These a b -> Ordering #

(<) :: These a b -> These a b -> Bool #

(<=) :: These a b -> These a b -> Bool #

(>) :: These a b -> These a b -> Bool #

(>=) :: These a b -> These a b -> Bool #

max :: These a b -> These a b -> These a b #

min :: These a b -> These a b -> These a b #

(Ord1 f, Ord a) => Ord (Lift f a) 
Instance details

Defined in Control.Applicative.Lift

Methods

compare :: Lift f a -> Lift f a -> Ordering #

(<) :: Lift f a -> Lift f a -> Bool #

(<=) :: Lift f a -> Lift f a -> Bool #

(>) :: Lift f a -> Lift f a -> Bool #

(>=) :: Lift f a -> Lift f a -> Bool #

max :: Lift f a -> Lift f a -> Lift f a #

min :: Lift f a -> Lift f a -> Lift f a #

(Ord1 m, Ord a) => Ord (ListT m a) 
Instance details

Defined in Control.Monad.Trans.List

Methods

compare :: ListT m a -> ListT m a -> Ordering #

(<) :: ListT m a -> ListT m a -> Bool #

(<=) :: ListT m a -> ListT m a -> Bool #

(>) :: ListT m a -> ListT m a -> Bool #

(>=) :: ListT m a -> ListT m a -> Bool #

max :: ListT m a -> ListT m a -> ListT m a #

min :: ListT m a -> ListT m a -> ListT m a #

(Ord1 m, Ord a) => Ord (MaybeT m a) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

compare :: MaybeT m a -> MaybeT m a -> Ordering #

(<) :: MaybeT m a -> MaybeT m a -> Bool #

(<=) :: MaybeT m a -> MaybeT m a -> Bool #

(>) :: MaybeT m a -> MaybeT m a -> Bool #

(>=) :: MaybeT m a -> MaybeT m a -> Bool #

max :: MaybeT m a -> MaybeT m a -> MaybeT m a #

min :: MaybeT m a -> MaybeT m a -> MaybeT m a #

(Ord k, Ord v) => Ord (HashMap k v)

The ordering is total and consistent with the Eq instance. However, nothing else about the ordering is specified, and it may change from version to version of either this package or of hashable.

Instance details

Defined in Data.HashMap.Internal

Methods

compare :: HashMap k v -> HashMap k v -> Ordering #

(<) :: HashMap k v -> HashMap k v -> Bool #

(<=) :: HashMap k v -> HashMap k v -> Bool #

(>) :: HashMap k v -> HashMap k v -> Bool #

(>=) :: HashMap k v -> HashMap k v -> Bool #

max :: HashMap k v -> HashMap k v -> HashMap k v #

min :: HashMap k v -> HashMap k v -> HashMap k v #

(Ord a, Ord b) => Ord (a, b) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b) -> (a, b) -> Ordering #

(<) :: (a, b) -> (a, b) -> Bool #

(<=) :: (a, b) -> (a, b) -> Bool #

(>) :: (a, b) -> (a, b) -> Bool #

(>=) :: (a, b) -> (a, b) -> Bool #

max :: (a, b) -> (a, b) -> (a, b) #

min :: (a, b) -> (a, b) -> (a, b) #

Ord a => Ord (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

compare :: Const a b -> Const a b -> Ordering #

(<) :: Const a b -> Const a b -> Bool #

(<=) :: Const a b -> Const a b -> Bool #

(>) :: Const a b -> Const a b -> Bool #

(>=) :: Const a b -> Const a b -> Bool #

max :: Const a b -> Const a b -> Const a b #

min :: Const a b -> Const a b -> Const a b #

Ord (f a) => Ord (Ap f a)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

compare :: Ap f a -> Ap f a -> Ordering #

(<) :: Ap f a -> Ap f a -> Bool #

(<=) :: Ap f a -> Ap f a -> Bool #

(>) :: Ap f a -> Ap f a -> Bool #

(>=) :: Ap f a -> Ap f a -> Bool #

max :: Ap f a -> Ap f a -> Ap f a #

min :: Ap f a -> Ap f a -> Ap f a #

Ord (f a) => Ord (Alt f a)

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

compare :: Alt f a -> Alt f a -> Ordering #

(<) :: Alt f a -> Alt f a -> Bool #

(<=) :: Alt f a -> Alt f a -> Bool #

(>) :: Alt f a -> Alt f a -> Bool #

(>=) :: Alt f a -> Alt f a -> Bool #

max :: Alt f a -> Alt f a -> Alt f a #

min :: Alt f a -> Alt f a -> Alt f a #

Ord (a :~: b)

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Equality

Methods

compare :: (a :~: b) -> (a :~: b) -> Ordering #

(<) :: (a :~: b) -> (a :~: b) -> Bool #

(<=) :: (a :~: b) -> (a :~: b) -> Bool #

(>) :: (a :~: b) -> (a :~: b) -> Bool #

(>=) :: (a :~: b) -> (a :~: b) -> Bool #

max :: (a :~: b) -> (a :~: b) -> a :~: b #

min :: (a :~: b) -> (a :~: b) -> a :~: b #

Ord (f p) => Ord (Rec1 f p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: Rec1 f p -> Rec1 f p -> Ordering #

(<) :: Rec1 f p -> Rec1 f p -> Bool #

(<=) :: Rec1 f p -> Rec1 f p -> Bool #

(>) :: Rec1 f p -> Rec1 f p -> Bool #

(>=) :: Rec1 f p -> Rec1 f p -> Bool #

max :: Rec1 f p -> Rec1 f p -> Rec1 f p #

min :: Rec1 f p -> Rec1 f p -> Rec1 f p #

Ord (URec (Ptr ()) p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: URec (Ptr ()) p -> URec (Ptr ()) p -> Ordering #

(<) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool #

(<=) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool #

(>) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool #

(>=) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool #

max :: URec (Ptr ()) p -> URec (Ptr ()) p -> URec (Ptr ()) p #

min :: URec (Ptr ()) p -> URec (Ptr ()) p -> URec (Ptr ()) p #

Ord (URec Char p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: URec Char p -> URec Char p -> Ordering #

(<) :: URec Char p -> URec Char p -> Bool #

(<=) :: URec Char p -> URec Char p -> Bool #

(>) :: URec Char p -> URec Char p -> Bool #

(>=) :: URec Char p -> URec Char p -> Bool #

max :: URec Char p -> URec Char p -> URec Char p #

min :: URec Char p -> URec Char p -> URec Char p #

Ord (URec Double p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: URec Double p -> URec Double p -> Ordering #

(<) :: URec Double p -> URec Double p -> Bool #

(<=) :: URec Double p -> URec Double p -> Bool #

(>) :: URec Double p -> URec Double p -> Bool #

(>=) :: URec Double p -> URec Double p -> Bool #

max :: URec Double p -> URec Double p -> URec Double p #

min :: URec Double p -> URec Double p -> URec Double p #

Ord (URec Float p) 
Instance details

Defined in GHC.Generics

Methods

compare :: URec Float p -> URec Float p -> Ordering #

(<) :: URec Float p -> URec Float p -> Bool #

(<=) :: URec Float p -> URec Float p -> Bool #

(>) :: URec Float p -> URec Float p -> Bool #

(>=) :: URec Float p -> URec Float p -> Bool #

max :: URec Float p -> URec Float p -> URec Float p #

min :: URec Float p -> URec Float p -> URec Float p #

Ord (URec Int p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: URec Int p -> URec Int p -> Ordering #

(<) :: URec Int p -> URec Int p -> Bool #

(<=) :: URec Int p -> URec Int p -> Bool #

(>) :: URec Int p -> URec Int p -> Bool #

(>=) :: URec Int p -> URec Int p -> Bool #

max :: URec Int p -> URec Int p -> URec Int p #

min :: URec Int p -> URec Int p -> URec Int p #

Ord (URec Word p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: URec Word p -> URec Word p -> Ordering #

(<) :: URec Word p -> URec Word p -> Bool #

(<=) :: URec Word p -> URec Word p -> Bool #

(>) :: URec Word p -> URec Word p -> Bool #

(>=) :: URec Word p -> URec Word p -> Bool #

max :: URec Word p -> URec Word p -> URec Word p #

min :: URec Word p -> URec Word p -> URec Word p #

Ord (p a a) => Ord (Join p a) 
Instance details

Defined in Data.Bifunctor.Join

Methods

compare :: Join p a -> Join p a -> Ordering #

(<) :: Join p a -> Join p a -> Bool #

(<=) :: Join p a -> Join p a -> Bool #

(>) :: Join p a -> Join p a -> Bool #

(>=) :: Join p a -> Join p a -> Bool #

max :: Join p a -> Join p a -> Join p a #

min :: Join p a -> Join p a -> Join p a #

Ord (Money owner btcl mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

compare :: Money owner btcl mrel -> Money owner btcl mrel -> Ordering #

(<) :: Money owner btcl mrel -> Money owner btcl mrel -> Bool #

(<=) :: Money owner btcl mrel -> Money owner btcl mrel -> Bool #

(>) :: Money owner btcl mrel -> Money owner btcl mrel -> Bool #

(>=) :: Money owner btcl mrel -> Money owner btcl mrel -> Bool #

max :: Money owner btcl mrel -> Money owner btcl mrel -> Money owner btcl mrel #

min :: Money owner btcl mrel -> Money owner btcl mrel -> Money owner btcl mrel #

(Ord a, Ord (f b)) => Ord (FreeF f a b) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

compare :: FreeF f a b -> FreeF f a b -> Ordering #

(<) :: FreeF f a b -> FreeF f a b -> Bool #

(<=) :: FreeF f a b -> FreeF f a b -> Bool #

(>) :: FreeF f a b -> FreeF f a b -> Bool #

(>=) :: FreeF f a b -> FreeF f a b -> Bool #

max :: FreeF f a b -> FreeF f a b -> FreeF f a b #

min :: FreeF f a b -> FreeF f a b -> FreeF f a b #

(Ord1 f, Ord1 m, Ord a) => Ord (FreeT f m a) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

compare :: FreeT f m a -> FreeT f m a -> Ordering #

(<) :: FreeT f m a -> FreeT f m a -> Bool #

(<=) :: FreeT f m a -> FreeT f m a -> Bool #

(>) :: FreeT f m a -> FreeT f m a -> Bool #

(>=) :: FreeT f m a -> FreeT f m a -> Bool #

max :: FreeT f m a -> FreeT f m a -> FreeT f m a #

min :: FreeT f m a -> FreeT f m a -> FreeT f m a #

Ord b => Ord (Tagged s b) 
Instance details

Defined in Data.Tagged

Methods

compare :: Tagged s b -> Tagged s b -> Ordering #

(<) :: Tagged s b -> Tagged s b -> Bool #

(<=) :: Tagged s b -> Tagged s b -> Bool #

(>) :: Tagged s b -> Tagged s b -> Bool #

(>=) :: Tagged s b -> Tagged s b -> Bool #

max :: Tagged s b -> Tagged s b -> Tagged s b #

min :: Tagged s b -> Tagged s b -> Tagged s b #

(Ord1 f, Ord1 g, Ord a) => Ord (These1 f g a) 
Instance details

Defined in Data.Functor.These

Methods

compare :: These1 f g a -> These1 f g a -> Ordering #

(<) :: These1 f g a -> These1 f g a -> Bool #

(<=) :: These1 f g a -> These1 f g a -> Bool #

(>) :: These1 f g a -> These1 f g a -> Bool #

(>=) :: These1 f g a -> These1 f g a -> Bool #

max :: These1 f g a -> These1 f g a -> These1 f g a #

min :: These1 f g a -> These1 f g a -> These1 f g a #

(Ord1 f, Ord a) => Ord (Backwards f a) 
Instance details

Defined in Control.Applicative.Backwards

Methods

compare :: Backwards f a -> Backwards f a -> Ordering #

(<) :: Backwards f a -> Backwards f a -> Bool #

(<=) :: Backwards f a -> Backwards f a -> Bool #

(>) :: Backwards f a -> Backwards f a -> Bool #

(>=) :: Backwards f a -> Backwards f a -> Bool #

max :: Backwards f a -> Backwards f a -> Backwards f a #

min :: Backwards f a -> Backwards f a -> Backwards f a #

(Ord e, Ord1 m, Ord a) => Ord (ErrorT e m a) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

compare :: ErrorT e m a -> ErrorT e m a -> Ordering #

(<) :: ErrorT e m a -> ErrorT e m a -> Bool #

(<=) :: ErrorT e m a -> ErrorT e m a -> Bool #

(>) :: ErrorT e m a -> ErrorT e m a -> Bool #

(>=) :: ErrorT e m a -> ErrorT e m a -> Bool #

max :: ErrorT e m a -> ErrorT e m a -> ErrorT e m a #

min :: ErrorT e m a -> ErrorT e m a -> ErrorT e m a #

(Ord e, Ord1 m, Ord a) => Ord (ExceptT e m a) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

compare :: ExceptT e m a -> ExceptT e m a -> Ordering #

(<) :: ExceptT e m a -> ExceptT e m a -> Bool #

(<=) :: ExceptT e m a -> ExceptT e m a -> Bool #

(>) :: ExceptT e m a -> ExceptT e m a -> Bool #

(>=) :: ExceptT e m a -> ExceptT e m a -> Bool #

max :: ExceptT e m a -> ExceptT e m a -> ExceptT e m a #

min :: ExceptT e m a -> ExceptT e m a -> ExceptT e m a #

(Ord1 f, Ord a) => Ord (IdentityT f a) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

compare :: IdentityT f a -> IdentityT f a -> Ordering #

(<) :: IdentityT f a -> IdentityT f a -> Bool #

(<=) :: IdentityT f a -> IdentityT f a -> Bool #

(>) :: IdentityT f a -> IdentityT f a -> Bool #

(>=) :: IdentityT f a -> IdentityT f a -> Bool #

max :: IdentityT f a -> IdentityT f a -> IdentityT f a #

min :: IdentityT f a -> IdentityT f a -> IdentityT f a #

(Ord w, Ord1 m, Ord a) => Ord (WriterT w m a) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

compare :: WriterT w m a -> WriterT w m a -> Ordering #

(<) :: WriterT w m a -> WriterT w m a -> Bool #

(<=) :: WriterT w m a -> WriterT w m a -> Bool #

(>) :: WriterT w m a -> WriterT w m a -> Bool #

(>=) :: WriterT w m a -> WriterT w m a -> Bool #

max :: WriterT w m a -> WriterT w m a -> WriterT w m a #

min :: WriterT w m a -> WriterT w m a -> WriterT w m a #

(Ord w, Ord1 m, Ord a) => Ord (WriterT w m a) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

compare :: WriterT w m a -> WriterT w m a -> Ordering #

(<) :: WriterT w m a -> WriterT w m a -> Bool #

(<=) :: WriterT w m a -> WriterT w m a -> Bool #

(>) :: WriterT w m a -> WriterT w m a -> Bool #

(>=) :: WriterT w m a -> WriterT w m a -> Bool #

max :: WriterT w m a -> WriterT w m a -> WriterT w m a #

min :: WriterT w m a -> WriterT w m a -> WriterT w m a #

Ord a => Ord (Constant a b) 
Instance details

Defined in Data.Functor.Constant

Methods

compare :: Constant a b -> Constant a b -> Ordering #

(<) :: Constant a b -> Constant a b -> Bool #

(<=) :: Constant a b -> Constant a b -> Bool #

(>) :: Constant a b -> Constant a b -> Bool #

(>=) :: Constant a b -> Constant a b -> Bool #

max :: Constant a b -> Constant a b -> Constant a b #

min :: Constant a b -> Constant a b -> Constant a b #

(Ord1 f, Ord a) => Ord (Reverse f a) 
Instance details

Defined in Data.Functor.Reverse

Methods

compare :: Reverse f a -> Reverse f a -> Ordering #

(<) :: Reverse f a -> Reverse f a -> Bool #

(<=) :: Reverse f a -> Reverse f a -> Bool #

(>) :: Reverse f a -> Reverse f a -> Bool #

(>=) :: Reverse f a -> Reverse f a -> Bool #

max :: Reverse f a -> Reverse f a -> Reverse f a #

min :: Reverse f a -> Reverse f a -> Reverse f a #

(Ord a, Ord b, Ord c) => Ord (a, b, c) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c) -> (a, b, c) -> Ordering #

(<) :: (a, b, c) -> (a, b, c) -> Bool #

(<=) :: (a, b, c) -> (a, b, c) -> Bool #

(>) :: (a, b, c) -> (a, b, c) -> Bool #

(>=) :: (a, b, c) -> (a, b, c) -> Bool #

max :: (a, b, c) -> (a, b, c) -> (a, b, c) #

min :: (a, b, c) -> (a, b, c) -> (a, b, c) #

(Ord1 f, Ord1 g, Ord a) => Ord (Product f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Product

Methods

compare :: Product f g a -> Product f g a -> Ordering #

(<) :: Product f g a -> Product f g a -> Bool #

(<=) :: Product f g a -> Product f g a -> Bool #

(>) :: Product f g a -> Product f g a -> Bool #

(>=) :: Product f g a -> Product f g a -> Bool #

max :: Product f g a -> Product f g a -> Product f g a #

min :: Product f g a -> Product f g a -> Product f g a #

(Ord1 f, Ord1 g, Ord a) => Ord (Sum f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Sum

Methods

compare :: Sum f g a -> Sum f g a -> Ordering #

(<) :: Sum f g a -> Sum f g a -> Bool #

(<=) :: Sum f g a -> Sum f g a -> Bool #

(>) :: Sum f g a -> Sum f g a -> Bool #

(>=) :: Sum f g a -> Sum f g a -> Bool #

max :: Sum f g a -> Sum f g a -> Sum f g a #

min :: Sum f g a -> Sum f g a -> Sum f g a #

Ord (a :~~: b)

Since: base-4.10.0.0

Instance details

Defined in Data.Type.Equality

Methods

compare :: (a :~~: b) -> (a :~~: b) -> Ordering #

(<) :: (a :~~: b) -> (a :~~: b) -> Bool #

(<=) :: (a :~~: b) -> (a :~~: b) -> Bool #

(>) :: (a :~~: b) -> (a :~~: b) -> Bool #

(>=) :: (a :~~: b) -> (a :~~: b) -> Bool #

max :: (a :~~: b) -> (a :~~: b) -> a :~~: b #

min :: (a :~~: b) -> (a :~~: b) -> a :~~: b #

(Ord (f p), Ord (g p)) => Ord ((f :*: g) p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: (f :*: g) p -> (f :*: g) p -> Ordering #

(<) :: (f :*: g) p -> (f :*: g) p -> Bool #

(<=) :: (f :*: g) p -> (f :*: g) p -> Bool #

(>) :: (f :*: g) p -> (f :*: g) p -> Bool #

(>=) :: (f :*: g) p -> (f :*: g) p -> Bool #

max :: (f :*: g) p -> (f :*: g) p -> (f :*: g) p #

min :: (f :*: g) p -> (f :*: g) p -> (f :*: g) p #

(Ord (f p), Ord (g p)) => Ord ((f :+: g) p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: (f :+: g) p -> (f :+: g) p -> Ordering #

(<) :: (f :+: g) p -> (f :+: g) p -> Bool #

(<=) :: (f :+: g) p -> (f :+: g) p -> Bool #

(>) :: (f :+: g) p -> (f :+: g) p -> Bool #

(>=) :: (f :+: g) p -> (f :+: g) p -> Bool #

max :: (f :+: g) p -> (f :+: g) p -> (f :+: g) p #

min :: (f :+: g) p -> (f :+: g) p -> (f :+: g) p #

Ord c => Ord (K1 i c p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: K1 i c p -> K1 i c p -> Ordering #

(<) :: K1 i c p -> K1 i c p -> Bool #

(<=) :: K1 i c p -> K1 i c p -> Bool #

(>) :: K1 i c p -> K1 i c p -> Bool #

(>=) :: K1 i c p -> K1 i c p -> Bool #

max :: K1 i c p -> K1 i c p -> K1 i c p #

min :: K1 i c p -> K1 i c p -> K1 i c p #

(Ord a, Ord b, Ord c, Ord d) => Ord (a, b, c, d) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d) -> (a, b, c, d) -> Ordering #

(<) :: (a, b, c, d) -> (a, b, c, d) -> Bool #

(<=) :: (a, b, c, d) -> (a, b, c, d) -> Bool #

(>) :: (a, b, c, d) -> (a, b, c, d) -> Bool #

(>=) :: (a, b, c, d) -> (a, b, c, d) -> Bool #

max :: (a, b, c, d) -> (a, b, c, d) -> (a, b, c, d) #

min :: (a, b, c, d) -> (a, b, c, d) -> (a, b, c, d) #

(Ord1 f, Ord1 g, Ord a) => Ord (Compose f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

compare :: Compose f g a -> Compose f g a -> Ordering #

(<) :: Compose f g a -> Compose f g a -> Bool #

(<=) :: Compose f g a -> Compose f g a -> Bool #

(>) :: Compose f g a -> Compose f g a -> Bool #

(>=) :: Compose f g a -> Compose f g a -> Bool #

max :: Compose f g a -> Compose f g a -> Compose f g a #

min :: Compose f g a -> Compose f g a -> Compose f g a #

Ord (f (g p)) => Ord ((f :.: g) p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: (f :.: g) p -> (f :.: g) p -> Ordering #

(<) :: (f :.: g) p -> (f :.: g) p -> Bool #

(<=) :: (f :.: g) p -> (f :.: g) p -> Bool #

(>) :: (f :.: g) p -> (f :.: g) p -> Bool #

(>=) :: (f :.: g) p -> (f :.: g) p -> Bool #

max :: (f :.: g) p -> (f :.: g) p -> (f :.: g) p #

min :: (f :.: g) p -> (f :.: g) p -> (f :.: g) p #

Ord (f p) => Ord (M1 i c f p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: M1 i c f p -> M1 i c f p -> Ordering #

(<) :: M1 i c f p -> M1 i c f p -> Bool #

(<=) :: M1 i c f p -> M1 i c f p -> Bool #

(>) :: M1 i c f p -> M1 i c f p -> Bool #

(>=) :: M1 i c f p -> M1 i c f p -> Bool #

max :: M1 i c f p -> M1 i c f p -> M1 i c f p #

min :: M1 i c f p -> M1 i c f p -> M1 i c f p #

Ord (f a) => Ord (Clown f a b) 
Instance details

Defined in Data.Bifunctor.Clown

Methods

compare :: Clown f a b -> Clown f a b -> Ordering #

(<) :: Clown f a b -> Clown f a b -> Bool #

(<=) :: Clown f a b -> Clown f a b -> Bool #

(>) :: Clown f a b -> Clown f a b -> Bool #

(>=) :: Clown f a b -> Clown f a b -> Bool #

max :: Clown f a b -> Clown f a b -> Clown f a b #

min :: Clown f a b -> Clown f a b -> Clown f a b #

Ord (p b a) => Ord (Flip p a b) 
Instance details

Defined in Data.Bifunctor.Flip

Methods

compare :: Flip p a b -> Flip p a b -> Ordering #

(<) :: Flip p a b -> Flip p a b -> Bool #

(<=) :: Flip p a b -> Flip p a b -> Bool #

(>) :: Flip p a b -> Flip p a b -> Bool #

(>=) :: Flip p a b -> Flip p a b -> Bool #

max :: Flip p a b -> Flip p a b -> Flip p a b #

min :: Flip p a b -> Flip p a b -> Flip p a b #

Ord (g b) => Ord (Joker g a b) 
Instance details

Defined in Data.Bifunctor.Joker

Methods

compare :: Joker g a b -> Joker g a b -> Ordering #

(<) :: Joker g a b -> Joker g a b -> Bool #

(<=) :: Joker g a b -> Joker g a b -> Bool #

(>) :: Joker g a b -> Joker g a b -> Bool #

(>=) :: Joker g a b -> Joker g a b -> Bool #

max :: Joker g a b -> Joker g a b -> Joker g a b #

min :: Joker g a b -> Joker g a b -> Joker g a b #

Ord (p a b) => Ord (WrappedBifunctor p a b) 
Instance details

Defined in Data.Bifunctor.Wrapped

(Ord a, Ord b, Ord c, Ord d, Ord e) => Ord (a, b, c, d, e) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d, e) -> (a, b, c, d, e) -> Ordering #

(<) :: (a, b, c, d, e) -> (a, b, c, d, e) -> Bool #

(<=) :: (a, b, c, d, e) -> (a, b, c, d, e) -> Bool #

(>) :: (a, b, c, d, e) -> (a, b, c, d, e) -> Bool #

(>=) :: (a, b, c, d, e) -> (a, b, c, d, e) -> Bool #

max :: (a, b, c, d, e) -> (a, b, c, d, e) -> (a, b, c, d, e) #

min :: (a, b, c, d, e) -> (a, b, c, d, e) -> (a, b, c, d, e) #

(Ord (f a b), Ord (g a b)) => Ord (Product f g a b) 
Instance details

Defined in Data.Bifunctor.Product

Methods

compare :: Product f g a b -> Product f g a b -> Ordering #

(<) :: Product f g a b -> Product f g a b -> Bool #

(<=) :: Product f g a b -> Product f g a b -> Bool #

(>) :: Product f g a b -> Product f g a b -> Bool #

(>=) :: Product f g a b -> Product f g a b -> Bool #

max :: Product f g a b -> Product f g a b -> Product f g a b #

min :: Product f g a b -> Product f g a b -> Product f g a b #

(Ord (p a b), Ord (q a b)) => Ord (Sum p q a b) 
Instance details

Defined in Data.Bifunctor.Sum

Methods

compare :: Sum p q a b -> Sum p q a b -> Ordering #

(<) :: Sum p q a b -> Sum p q a b -> Bool #

(<=) :: Sum p q a b -> Sum p q a b -> Bool #

(>) :: Sum p q a b -> Sum p q a b -> Bool #

(>=) :: Sum p q a b -> Sum p q a b -> Bool #

max :: Sum p q a b -> Sum p q a b -> Sum p q a b #

min :: Sum p q a b -> Sum p q a b -> Sum p q a b #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f) => Ord (a, b, c, d, e, f) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> Ordering #

(<) :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> Bool #

(<=) :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> Bool #

(>) :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> Bool #

(>=) :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> Bool #

max :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> (a, b, c, d, e, f) #

min :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> (a, b, c, d, e, f) #

Ord (f (p a b)) => Ord (Tannen f p a b) 
Instance details

Defined in Data.Bifunctor.Tannen

Methods

compare :: Tannen f p a b -> Tannen f p a b -> Ordering #

(<) :: Tannen f p a b -> Tannen f p a b -> Bool #

(<=) :: Tannen f p a b -> Tannen f p a b -> Bool #

(>) :: Tannen f p a b -> Tannen f p a b -> Bool #

(>=) :: Tannen f p a b -> Tannen f p a b -> Bool #

max :: Tannen f p a b -> Tannen f p a b -> Tannen f p a b #

min :: Tannen f p a b -> Tannen f p a b -> Tannen f p a b #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g) => Ord (a, b, c, d, e, f, g) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> Ordering #

(<) :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> Bool #

(<=) :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> Bool #

(>) :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> Bool #

(>=) :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> Bool #

max :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) #

min :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h) => Ord (a, b, c, d, e, f, g, h) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> Ordering #

(<) :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> Bool #

(<=) :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> Bool #

(>) :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> Bool #

(>=) :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> Bool #

max :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) #

min :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) #

Ord (p (f a) (g b)) => Ord (Biff p f g a b) 
Instance details

Defined in Data.Bifunctor.Biff

Methods

compare :: Biff p f g a b -> Biff p f g a b -> Ordering #

(<) :: Biff p f g a b -> Biff p f g a b -> Bool #

(<=) :: Biff p f g a b -> Biff p f g a b -> Bool #

(>) :: Biff p f g a b -> Biff p f g a b -> Bool #

(>=) :: Biff p f g a b -> Biff p f g a b -> Bool #

max :: Biff p f g a b -> Biff p f g a b -> Biff p f g a b #

min :: Biff p f g a b -> Biff p f g a b -> Biff p f g a b #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i) => Ord (a, b, c, d, e, f, g, h, i) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> Ordering #

(<) :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> Bool #

(<=) :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> Bool #

(>) :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> Bool #

(>=) :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> Bool #

max :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) #

min :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j) => Ord (a, b, c, d, e, f, g, h, i, j) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> Ordering #

(<) :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> Bool #

(<=) :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> Bool #

(>) :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> Bool #

(>=) :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> Bool #

max :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) #

min :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j, Ord k) => Ord (a, b, c, d, e, f, g, h, i, j, k) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> Ordering #

(<) :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> Bool #

(<=) :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> Bool #

(>) :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> Bool #

(>=) :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> Bool #

max :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) #

min :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j, Ord k, Ord l) => Ord (a, b, c, d, e, f, g, h, i, j, k, l) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> Ordering #

(<) :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> Bool #

(<=) :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> Bool #

(>) :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> Bool #

(>=) :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> Bool #

max :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) #

min :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j, Ord k, Ord l, Ord m) => Ord (a, b, c, d, e, f, g, h, i, j, k, l, m) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Ordering #

(<) :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Bool #

(<=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Bool #

(>) :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Bool #

(>=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Bool #

max :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) #

min :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j, Ord k, Ord l, Ord m, Ord n) => Ord (a, b, c, d, e, f, g, h, i, j, k, l, m, n) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Ordering #

(<) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Bool #

(<=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Bool #

(>) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Bool #

(>=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Bool #

max :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) #

min :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j, Ord k, Ord l, Ord m, Ord n, Ord o) => Ord (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Ordering #

(<) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Bool #

(<=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Bool #

(>) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Bool #

(>=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Bool #

max :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) #

min :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) #

class Read a #

Parsing of Strings, producing values.

Derived instances of Read make the following assumptions, which derived instances of Show obey:

  • If the constructor is defined to be an infix operator, then the derived Read instance will parse only infix applications of the constructor (not the prefix form).
  • Associativity is not used to reduce the occurrence of parentheses, although precedence may be.
  • If the constructor is defined using record syntax, the derived Read will parse only the record-syntax form, and furthermore, the fields must be given in the same order as the original declaration.
  • The derived Read instance allows arbitrary Haskell whitespace between tokens of the input string. Extra parentheses are also allowed.

For example, given the declarations

infixr 5 :^:
data Tree a =  Leaf a  |  Tree a :^: Tree a

the derived instance of Read in Haskell 2010 is equivalent to

instance (Read a) => Read (Tree a) where

        readsPrec d r =  readParen (d > app_prec)
                         (\r -> [(Leaf m,t) |
                                 ("Leaf",s) <- lex r,
                                 (m,t) <- readsPrec (app_prec+1) s]) r

                      ++ readParen (d > up_prec)
                         (\r -> [(u:^:v,w) |
                                 (u,s) <- readsPrec (up_prec+1) r,
                                 (":^:",t) <- lex s,
                                 (v,w) <- readsPrec (up_prec+1) t]) r

          where app_prec = 10
                up_prec = 5

Note that right-associativity of :^: is unused.

The derived instance in GHC is equivalent to

instance (Read a) => Read (Tree a) where

        readPrec = parens $ (prec app_prec $ do
                                 Ident "Leaf" <- lexP
                                 m <- step readPrec
                                 return (Leaf m))

                     +++ (prec up_prec $ do
                                 u <- step readPrec
                                 Symbol ":^:" <- lexP
                                 v <- step readPrec
                                 return (u :^: v))

          where app_prec = 10
                up_prec = 5

        readListPrec = readListPrecDefault

Why do both readsPrec and readPrec exist, and why does GHC opt to implement readPrec in derived Read instances instead of readsPrec? The reason is that readsPrec is based on the ReadS type, and although ReadS is mentioned in the Haskell 2010 Report, it is not a very efficient parser data structure.

readPrec, on the other hand, is based on a much more efficient ReadPrec datatype (a.k.a "new-style parsers"), but its definition relies on the use of the RankNTypes language extension. Therefore, readPrec (and its cousin, readListPrec) are marked as GHC-only. Nevertheless, it is recommended to use readPrec instead of readsPrec whenever possible for the efficiency improvements it brings.

As mentioned above, derived Read instances in GHC will implement readPrec instead of readsPrec. The default implementations of readsPrec (and its cousin, readList) will simply use readPrec under the hood. If you are writing a Read instance by hand, it is recommended to write it like so:

instance Read T where
  readPrec     = ...
  readListPrec = readListPrecDefault

Minimal complete definition

readsPrec | readPrec

Instances

Instances details
Read DotNetTime 
Instance details

Defined in Data.Aeson.Types.Internal

Read Value 
Instance details

Defined in Data.Aeson.Types.Internal

Read All

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Read Any

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Read Version

Since: base-2.1

Instance details

Defined in Data.Version

Read Void

Reading a Void value is always a parse error, considering Void as a data type with no constructors.

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Read CBool 
Instance details

Defined in Foreign.C.Types

Read CChar 
Instance details

Defined in Foreign.C.Types

Read CClock 
Instance details

Defined in Foreign.C.Types

Read CDouble 
Instance details

Defined in Foreign.C.Types

Read CFloat 
Instance details

Defined in Foreign.C.Types

Read CInt 
Instance details

Defined in Foreign.C.Types

Read CIntMax 
Instance details

Defined in Foreign.C.Types

Read CIntPtr 
Instance details

Defined in Foreign.C.Types

Read CLLong 
Instance details

Defined in Foreign.C.Types

Read CLong 
Instance details

Defined in Foreign.C.Types

Read CPtrdiff 
Instance details

Defined in Foreign.C.Types

Read CSChar 
Instance details

Defined in Foreign.C.Types

Read CSUSeconds 
Instance details

Defined in Foreign.C.Types

Read CShort 
Instance details

Defined in Foreign.C.Types

Read CSigAtomic 
Instance details

Defined in Foreign.C.Types

Read CSize 
Instance details

Defined in Foreign.C.Types

Read CTime 
Instance details

Defined in Foreign.C.Types

Read CUChar 
Instance details

Defined in Foreign.C.Types

Read CUInt 
Instance details

Defined in Foreign.C.Types

Read CUIntMax 
Instance details

Defined in Foreign.C.Types

Read CUIntPtr 
Instance details

Defined in Foreign.C.Types

Read CULLong 
Instance details

Defined in Foreign.C.Types

Read CULong 
Instance details

Defined in Foreign.C.Types

Read CUSeconds 
Instance details

Defined in Foreign.C.Types

Read CUShort 
Instance details

Defined in Foreign.C.Types

Read CWchar 
Instance details

Defined in Foreign.C.Types

Read Associativity

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Read DecidedStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Read Fixity

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Read SourceStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Read SourceUnpackedness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Read SeekMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Device

Read ExitCode 
Instance details

Defined in GHC.IO.Exception

Read BufferMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Handle.Types

Read Newline

Since: base-4.3.0.0

Instance details

Defined in GHC.IO.Handle.Types

Read NewlineMode

Since: base-4.3.0.0

Instance details

Defined in GHC.IO.Handle.Types

Read IOMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.IOMode

Read Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Read Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Read Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Read Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Read GCDetails

Since: base-4.10.0.0

Instance details

Defined in GHC.Stats

Read RTSStats

Since: base-4.10.0.0

Instance details

Defined in GHC.Stats

Read SomeSymbol

Since: base-4.7.0.0

Instance details

Defined in GHC.TypeLits

Read SomeNat

Since: base-4.7.0.0

Instance details

Defined in GHC.TypeNats

Read GeneralCategory

Since: base-2.1

Instance details

Defined in GHC.Read

Read Word16

Since: base-2.1

Instance details

Defined in GHC.Read

Read Word32

Since: base-2.1

Instance details

Defined in GHC.Read

Read Word64

Since: base-2.1

Instance details

Defined in GHC.Read

Read CBlkCnt 
Instance details

Defined in System.Posix.Types

Read CBlkSize 
Instance details

Defined in System.Posix.Types

Read CCc 
Instance details

Defined in System.Posix.Types

Read CClockId 
Instance details

Defined in System.Posix.Types

Read CDev 
Instance details

Defined in System.Posix.Types

Read CFsBlkCnt 
Instance details

Defined in System.Posix.Types

Read CFsFilCnt 
Instance details

Defined in System.Posix.Types

Read CGid 
Instance details

Defined in System.Posix.Types

Read CId 
Instance details

Defined in System.Posix.Types

Read CIno 
Instance details

Defined in System.Posix.Types

Read CKey 
Instance details

Defined in System.Posix.Types

Read CMode 
Instance details

Defined in System.Posix.Types

Read CNfds 
Instance details

Defined in System.Posix.Types

Read CNlink 
Instance details

Defined in System.Posix.Types

Read COff 
Instance details

Defined in System.Posix.Types

Read CPid 
Instance details

Defined in System.Posix.Types

Read CRLim 
Instance details

Defined in System.Posix.Types

Read CSocklen 
Instance details

Defined in System.Posix.Types

Read CSpeed 
Instance details

Defined in System.Posix.Types

Read CSsize 
Instance details

Defined in System.Posix.Types

Read CTcflag 
Instance details

Defined in System.Posix.Types

Read CUid 
Instance details

Defined in System.Posix.Types

Read Fd 
Instance details

Defined in System.Posix.Types

Read Lexeme

Since: base-2.1

Instance details

Defined in GHC.Read

Read BlkStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Read LnChanStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Read LnInvoiceStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Read LogFormat Source # 
Instance details

Defined in BtcLsp.Data.Type

Read NodePubKeyHex Source # 
Instance details

Defined in BtcLsp.Data.Type

Read NodeUriHex Source # 
Instance details

Defined in BtcLsp.Data.Type

Read Nonce Source # 
Instance details

Defined in BtcLsp.Data.Type

Read Privacy Source # 
Instance details

Defined in BtcLsp.Data.Type

Read RHashHex Source # 
Instance details

Defined in BtcLsp.Data.Type

Read SwapHash Source # 
Instance details

Defined in BtcLsp.Data.Type

Read SwapStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Read SwapUtxoStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Read UtxoLockId Source # 
Instance details

Defined in BtcLsp.Data.Type

Read YesodLog Source # 
Instance details

Defined in BtcLsp.Data.Type

Read GCPort Source # 
Instance details

Defined in BtcLsp.Grpc.Client.LowLevel

Read Encryption Source # 
Instance details

Defined in BtcLsp.Grpc.Data

Read BootstrapColor Source # 
Instance details

Defined in BtcLsp.Yesod.Data.BootstrapColor

Read Code Source # 
Instance details

Defined in BtcLsp.Yesod.Data.Language

Read HtmlClassAttr Source # 
Instance details

Defined in BtcLsp.Yesod.Data.Widget

Read Layout Source # 
Instance details

Defined in BtcLsp.Yesod.Data.Widget

Read ByteString 
Instance details

Defined in Data.ByteString.Internal

Read ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Read ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Read Date 
Instance details

Defined in Chronos

Read Datetime 
Instance details

Defined in Chronos

Read DatetimeFormat 
Instance details

Defined in Chronos

Read Day 
Instance details

Defined in Chronos

Read DayOfMonth 
Instance details

Defined in Chronos

Read DayOfWeek 
Instance details

Defined in Chronos

Read DayOfYear 
Instance details

Defined in Chronos

Read Month 
Instance details

Defined in Chronos

Read MonthDate 
Instance details

Defined in Chronos

Read Offset 
Instance details

Defined in Chronos

Read OffsetDatetime 
Instance details

Defined in Chronos

Read OffsetFormat 
Instance details

Defined in Chronos

Read OrdinalDate 
Instance details

Defined in Chronos

Read SubsecondPrecision 
Instance details

Defined in Chronos

Read Time 
Instance details

Defined in Chronos

Read TimeInterval 
Instance details

Defined in Chronos

Read TimeOfDay 
Instance details

Defined in Chronos

Read TimeParts 
Instance details

Defined in Chronos

Read Timespan 
Instance details

Defined in Chronos

Read Year 
Instance details

Defined in Chronos

Read Clock 
Instance details

Defined in System.Clock

Read TimeSpec 
Instance details

Defined in System.Clock

Read IntSet 
Instance details

Defined in Data.IntSet.Internal

Read EmailAddress 
Instance details

Defined in Text.Email.Parser

Read SecretVision 
Instance details

Defined in Text.PrettyPrint.GenericPretty.Type

Read Ordering

Since: base-2.1

Instance details

Defined in GHC.Read

Read Cookie 
Instance details

Defined in Network.HTTP.Client.Types

Read CookieJar 
Instance details

Defined in Network.HTTP.Client.Types

Read Proxy 
Instance details

Defined in Network.HTTP.Client.Types

Read ProxySecureMode 
Instance details

Defined in Network.HTTP.Client.Types

Read DigestAuthExceptionDetails 
Instance details

Defined in Network.HTTP.Client.TLS

Read StdMethod 
Instance details

Defined in Network.HTTP.Types.Method

Read ErrorCodeId 
Instance details

Defined in Network.HTTP2.Frame.Types

Read Frame 
Instance details

Defined in Network.HTTP2.Frame.Types

Read FrameHeader 
Instance details

Defined in Network.HTTP2.Frame.Types

Read FramePayload 
Instance details

Defined in Network.HTTP2.Frame.Types

Read HTTP2Error 
Instance details

Defined in Network.HTTP2.Frame.Types

Read Priority 
Instance details

Defined in Network.HTTP2.Frame.Types

Read SettingsKeyId 
Instance details

Defined in Network.HTTP2.Frame.Types

Read IP 
Instance details

Defined in Data.IP.Addr

Read IPv4 
Instance details

Defined in Data.IP.Addr

Read IPv6 
Instance details

Defined in Data.IP.Addr

Read IPRange 
Instance details

Defined in Data.IP.Range

Read Environment 
Instance details

Defined in Katip.Core

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 ChanId 
Instance details

Defined in LndClient.Data.Newtype

Read MSat 
Instance details

Defined in LndClient.Data.Newtype

Read NodeLocation 
Instance details

Defined in LndClient.Data.Newtype

Methods

readsPrec :: Int -> ReadS NodeLocation #

readList :: ReadS [NodeLocation] #

readPrec :: ReadPrec NodeLocation #

readListPrec :: ReadPrec [NodeLocation] #

Read NodePubKey 
Instance details

Defined in LndClient.Data.Newtype

Read LightningAddress 
Instance details

Defined in LndClient.Data.Peer

Methods

readsPrec :: Int -> ReadS LightningAddress #

readList :: ReadS [LightningAddress] #

readPrec :: ReadPrec LightningAddress #

readListPrec :: ReadPrec [LightningAddress] #

Read LnInitiator 
Instance details

Defined in LndClient.Data.Type

Methods

readsPrec :: Int -> ReadS LnInitiator #

readList :: ReadS [LnInitiator] #

readPrec :: ReadPrec LnInitiator #

readListPrec :: ReadPrec [LnInitiator] #

Read LoggingMeta 
Instance details

Defined in LndClient.Data.Type

Methods

readsPrec :: Int -> ReadS LoggingMeta #

readList :: ReadS [LoggingMeta] #

readPrec :: ReadPrec LoggingMeta #

readListPrec :: ReadPrec [LoggingMeta] #

Read LogLevel 
Instance details

Defined in Control.Monad.Logger

Read AddrInfoFlag 
Instance details

Defined in Network.Socket.Info

Read NameInfoFlag 
Instance details

Defined in Network.Socket.Info

Read Family 
Instance details

Defined in Network.Socket.Types

Read PortNumber 
Instance details

Defined in Network.Socket.Types

Read SocketType 
Instance details

Defined in Network.Socket.Types

Read Block 
Instance details

Defined in Network.Bitcoin.BlockChain

Methods

readsPrec :: Int -> ReadS Block #

readList :: ReadS [Block] #

readPrec :: ReadPrec Block #

readListPrec :: ReadPrec [Block] #

Read BlockChainInfo 
Instance details

Defined in Network.Bitcoin.BlockChain

Methods

readsPrec :: Int -> ReadS BlockChainInfo #

readList :: ReadS [BlockChainInfo] #

readPrec :: ReadPrec BlockChainInfo #

readListPrec :: ReadPrec [BlockChainInfo] #

Read BlockVerbose 
Instance details

Defined in Network.Bitcoin.BlockChain

Methods

readsPrec :: Int -> ReadS BlockVerbose #

readList :: ReadS [BlockVerbose] #

readPrec :: ReadPrec BlockVerbose #

readListPrec :: ReadPrec [BlockVerbose] #

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 BitcoinRpcError 
Instance details

Defined in Network.Bitcoin.Internal

Methods

readsPrec :: Int -> ReadS BitcoinRpcError #

readList :: ReadS [BitcoinRpcError] #

readPrec :: ReadPrec BitcoinRpcError #

readListPrec :: ReadPrec [BitcoinRpcError] #

Read BlockInfo 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

readsPrec :: Int -> ReadS BlockInfo #

readList :: ReadS [BlockInfo] #

readPrec :: ReadPrec BlockInfo #

readListPrec :: ReadPrec [BlockInfo] #

Read DecodedPsbt 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

readsPrec :: Int -> ReadS DecodedPsbt #

readList :: ReadS [DecodedPsbt] #

readPrec :: ReadPrec DecodedPsbt #

readListPrec :: ReadPrec [DecodedPsbt] #

Read DecodedRawTransaction 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

readsPrec :: Int -> ReadS DecodedRawTransaction #

readList :: ReadS [DecodedRawTransaction] #

readPrec :: ReadPrec DecodedRawTransaction #

readListPrec :: ReadPrec [DecodedRawTransaction] #

Read RawTransactionInfo 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

readsPrec :: Int -> ReadS RawTransactionInfo #

readList :: ReadS [RawTransactionInfo] #

readPrec :: ReadPrec RawTransactionInfo #

readListPrec :: ReadPrec [RawTransactionInfo] #

Read ScriptPubKey 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

readsPrec :: Int -> ReadS ScriptPubKey #

readList :: ReadS [ScriptPubKey] #

readPrec :: ReadPrec ScriptPubKey #

readListPrec :: ReadPrec [ScriptPubKey] #

Read ScriptSig 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

readsPrec :: Int -> ReadS ScriptSig #

readList :: ReadS [ScriptSig] #

readPrec :: ReadPrec ScriptSig #

readListPrec :: ReadPrec [ScriptSig] #

Read TxIn 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

readsPrec :: Int -> ReadS TxIn #

readList :: ReadS [TxIn] #

readPrec :: ReadPrec TxIn #

readListPrec :: ReadPrec [TxIn] #

Read TxOut 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

readsPrec :: Int -> ReadS TxOut #

readList :: ReadS [TxOut] #

readPrec :: ReadPrec TxOut #

readListPrec :: ReadPrec [TxOut] #

Read TxnOutputType 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

readsPrec :: Int -> ReadS TxnOutputType #

readList :: ReadS [TxnOutputType] #

readPrec :: ReadPrec TxnOutputType #

readListPrec :: ReadPrec [TxnOutputType] #

Read BitcoinException 
Instance details

Defined in Network.Bitcoin.Types

Methods

readsPrec :: Int -> ReadS BitcoinException #

readList :: ReadS [BitcoinException] #

readPrec :: ReadPrec BitcoinException #

readListPrec :: ReadPrec [BitcoinException] #

Read TransactionID 
Instance details

Defined in Network.Bitcoin.Types

Methods

readsPrec :: Int -> ReadS TransactionID #

readList :: ReadS [TransactionID] #

readPrec :: ReadPrec TransactionID #

readListPrec :: ReadPrec [TransactionID] #

Read AddrInfo 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

readsPrec :: Int -> ReadS AddrInfo #

readList :: ReadS [AddrInfo] #

readPrec :: ReadPrec AddrInfo #

readListPrec :: ReadPrec [AddrInfo] #

Read AddressInfo 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

readsPrec :: Int -> ReadS AddressInfo #

readList :: ReadS [AddressInfo] #

readPrec :: ReadPrec AddressInfo #

readListPrec :: ReadPrec [AddressInfo] #

Read BitcoindInfo 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

readsPrec :: Int -> ReadS BitcoindInfo #

readList :: ReadS [BitcoindInfo] #

readPrec :: ReadPrec BitcoindInfo #

readListPrec :: ReadPrec [BitcoindInfo] #

Read ReceivedByAccount 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

readsPrec :: Int -> ReadS ReceivedByAccount #

readList :: ReadS [ReceivedByAccount] #

readPrec :: ReadPrec ReceivedByAccount #

readListPrec :: ReadPrec [ReceivedByAccount] #

Read ReceivedByAddress 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

readsPrec :: Int -> ReadS ReceivedByAddress #

readList :: ReadS [ReceivedByAddress] #

readPrec :: ReadPrec ReceivedByAddress #

readListPrec :: ReadPrec [ReceivedByAddress] #

Read ScrPubKey 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

readsPrec :: Int -> ReadS ScrPubKey #

readList :: ReadS [ScrPubKey] #

readPrec :: ReadPrec ScrPubKey #

readListPrec :: ReadPrec [ScrPubKey] #

Read TransactionCategory 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

readsPrec :: Int -> ReadS TransactionCategory #

readList :: ReadS [TransactionCategory] #

readPrec :: ReadPrec TransactionCategory #

readListPrec :: ReadPrec [TransactionCategory] #

Read ConstraintNameDB 
Instance details

Defined in Database.Persist.Names

Read ConstraintNameHS 
Instance details

Defined in Database.Persist.Names

Read EntityNameDB 
Instance details

Defined in Database.Persist.Names

Read EntityNameHS 
Instance details

Defined in Database.Persist.Names

Read FieldNameDB 
Instance details

Defined in Database.Persist.Names

Read FieldNameHS 
Instance details

Defined in Database.Persist.Names

Read LiteralType 
Instance details

Defined in Database.Persist.PersistValue

Read PersistValue 
Instance details

Defined in Database.Persist.PersistValue

Read CascadeAction 
Instance details

Defined in Database.Persist.Types.Base

Read Checkmark 
Instance details

Defined in Database.Persist.Types.Base

Read CompositeDef 
Instance details

Defined in Database.Persist.Types.Base

Read EmbedEntityDef 
Instance details

Defined in Database.Persist.Types.Base

Read EmbedFieldDef 
Instance details

Defined in Database.Persist.Types.Base

Read EntityDef 
Instance details

Defined in Database.Persist.Types.Base

Read EntityIdDef 
Instance details

Defined in Database.Persist.Types.Base

Read FieldAttr 
Instance details

Defined in Database.Persist.Types.Base

Read FieldCascade 
Instance details

Defined in Database.Persist.Types.Base

Read FieldDef 
Instance details

Defined in Database.Persist.Types.Base

Read FieldType 
Instance details

Defined in Database.Persist.Types.Base

Read ForeignDef 
Instance details

Defined in Database.Persist.Types.Base

Read PersistFilter 
Instance details

Defined in Database.Persist.Types.Base

Read PersistUpdate 
Instance details

Defined in Database.Persist.Types.Base

Read ReferenceDef 
Instance details

Defined in Database.Persist.Types.Base

Read SelfEmbed 
Instance details

Defined in Database.Persist.Types.Base

Methods

readsPrec :: Int -> ReadS SelfEmbed #

readList :: ReadS [SelfEmbed] #

readPrec :: ReadPrec SelfEmbed #

readListPrec :: ReadPrec [SelfEmbed] #

Read SqlType 
Instance details

Defined in Database.Persist.Types.Base

Read UniqueDef 
Instance details

Defined in Database.Persist.Types.Base

Read PostgresConf 
Instance details

Defined in Database.Persist.Postgresql

Read ConnectInfo 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

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 ReleaseType 
Instance details

Defined in Data.Acquire.Internal

Read Scientific

Supports the skipping of parentheses and whitespaces. Example:

> read " ( ((  -1.0e+3 ) ))" :: Scientific
-1000.0

(Note: This Read instance makes internal use of scientificP to parse the floating-point number.)

Instance details

Defined in Data.Scientific

Read Msg 
Instance details

Defined in Crypto.Secp256k1

Read PubKey 
Instance details

Defined in Crypto.Secp256k1

Read SecKey 
Instance details

Defined in Crypto.Secp256k1

Read Sig 
Instance details

Defined in Crypto.Secp256k1

Read Tweak 
Instance details

Defined in Crypto.Secp256k1

Read Binding 
Instance details

Defined in Text.Hamlet.Parse

Methods

readsPrec :: Int -> ReadS Binding #

readList :: ReadS [Binding] #

readPrec :: ReadPrec Binding #

readListPrec :: ReadPrec [Binding] #

Read Content 
Instance details

Defined in Text.Hamlet.Parse

Methods

readsPrec :: Int -> ReadS Content #

readList :: ReadS [Content] #

readPrec :: ReadPrec Content #

readListPrec :: ReadPrec [Content] #

Read DataConstr 
Instance details

Defined in Text.Hamlet.Parse

Methods

readsPrec :: Int -> ReadS DataConstr #

readList :: ReadS [DataConstr] #

readPrec :: ReadPrec DataConstr #

readListPrec :: ReadPrec [DataConstr] #

Read Doc 
Instance details

Defined in Text.Hamlet.Parse

Methods

readsPrec :: Int -> ReadS Doc #

readList :: ReadS [Doc] #

readPrec :: ReadPrec Doc #

readListPrec :: ReadPrec [Doc] #

Read Line 
Instance details

Defined in Text.Hamlet.Parse

Methods

readsPrec :: Int -> ReadS Line #

readList :: ReadS [Line] #

readPrec :: ReadPrec Line #

readListPrec :: ReadPrec [Line] #

Read Module 
Instance details

Defined in Text.Hamlet.Parse

Methods

readsPrec :: Int -> ReadS Module #

readList :: ReadS [Module] #

readPrec :: ReadPrec Module #

readListPrec :: ReadPrec [Module] #

Read Deref 
Instance details

Defined in Text.Shakespeare.Base

Read Ident 
Instance details

Defined in Text.Shakespeare.Base

Read HostPreference 
Instance details

Defined in Data.Streaming.Network.Internal

Read Leniency 
Instance details

Defined in Data.String.Conv

Read ShortText 
Instance details

Defined in Data.Text.Short.Internal

Read DatatypeVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Read Undefined 
Instance details

Defined in Universum.Debug

Read UUID 
Instance details

Defined in Data.UUID.Types.Internal

Read UnpackedUUID 
Instance details

Defined in Data.UUID.Types.Internal

Read Int128 
Instance details

Defined in Data.WideWord.Int128

Read Word128 
Instance details

Defined in Data.WideWord.Word128

Read Word256 
Instance details

Defined in Data.WideWord.Word256

Read AuthResult 
Instance details

Defined in Yesod.Core.Types

Read SessionCookie 
Instance details

Defined in Yesod.Core.Types

Read Textarea 
Instance details

Defined in Yesod.Form.Fields

Read FormMessage 
Instance details

Defined in Yesod.Form.Types

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 Word8

Since: base-2.1

Instance details

Defined in GHC.Read

Read Integer

Since: base-2.1

Instance details

Defined in GHC.Read

Read Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Read

Read ()

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS () #

readList :: ReadS [()] #

readPrec :: ReadPrec () #

readListPrec :: ReadPrec [()] #

Read Bool

Since: base-2.1

Instance details

Defined in GHC.Read

Read Char

Since: base-2.1

Instance details

Defined in GHC.Read

Read Double

Since: base-2.1

Instance details

Defined in GHC.Read

Read Float

Since: base-2.1

Instance details

Defined in GHC.Read

Read Int

Since: base-2.1

Instance details

Defined in GHC.Read

Read Word

Since: base-4.5.0.0

Instance details

Defined in GHC.Read

Read a => Read (Only a) 
Instance details

Defined in Data.Tuple.Only

Read a => Read (ZipList a)

Since: base-4.7.0.0

Instance details

Defined in Control.Applicative

Read a => Read (Complex a)

Since: base-2.1

Instance details

Defined in Data.Complex

Read a => Read (Identity a)

This instance would be equivalent to the derived instances of the Identity newtype if the runIdentity field were removed

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Read a => Read (First a)

Since: base-2.1

Instance details

Defined in Data.Monoid

Read a => Read (Last a)

Since: base-2.1

Instance details

Defined in Data.Monoid

Read a => Read (Down a)

This instance would be equivalent to the derived instances of the Down newtype if the getDown field were removed

Since: base-4.7.0.0

Instance details

Defined in Data.Ord

Read a => Read (First a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Read a => Read (Last a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Read a => Read (Max a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Read a => Read (Min a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Read a => Read (Option a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Read m => Read (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Read a => Read (Dual a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Read a => Read (Product a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Read a => Read (Sum a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Read a => Read (NonEmpty a)

Since: base-4.11.0.0

Instance details

Defined in GHC.Read

Read p => Read (Par1 p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

(Integral a, Read a) => Read (Ratio a)

Since: base-2.1

Instance details

Defined in GHC.Read

Read (OnChainAddress mrel) Source # 
Instance details

Defined in BtcLsp.Data.Smart

Read (Liquidity dir) Source # 
Instance details

Defined in BtcLsp.Data.Type

Read (UnsafeOnChainAddress mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Read (Uuid tab) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

readsPrec :: Int -> ReadS (Uuid tab) #

readList :: ReadS [Uuid tab] #

readPrec :: ReadPrec (Uuid tab) #

readListPrec :: ReadPrec [Uuid tab] #

(Read s, FoldCase s) => Read (CI s) 
Instance details

Defined in Data.CaseInsensitive.Internal

Read a => Read (MeridiemLocale a) 
Instance details

Defined in Chronos

Read e => Read (IntMap e) 
Instance details

Defined in Data.IntMap.Internal

Read a => Read (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Read a => Read (ViewL a) 
Instance details

Defined in Data.Sequence.Internal

Read a => Read (ViewR a) 
Instance details

Defined in Data.Sequence.Internal

(Read a, Ord a) => Read (Set a) 
Instance details

Defined in Data.Set.Internal

Read a => Read (Tree a) 
Instance details

Defined in Data.Tree

HashAlgorithm a => Read (Digest a) 
Instance details

Defined in Crypto.Hash.Types

Read1 f => Read (Fix f) 
Instance details

Defined in Data.Fix

(Functor f, Read1 f) => Read (Mu f) 
Instance details

Defined in Data.Fix

(Functor f, Read1 f) => Read (Nu f) 
Instance details

Defined in Data.Fix

Read a => Read (DNonEmpty a) 
Instance details

Defined in Data.DList.DNonEmpty.Internal

Read a => Read (DList a) 
Instance details

Defined in Data.DList.Internal

Read a => Read (FromListCounting a) 
Instance details

Defined in Data.Graph.Inductive.PatriciaTree

Methods

readsPrec :: Int -> ReadS (FromListCounting a) #

readList :: ReadS [FromListCounting a] #

readPrec :: ReadPrec (FromListCounting a) #

readListPrec :: ReadPrec [FromListCounting a] #

Read a => Read (LenientData a) 
Instance details

Defined in Web.Internal.HttpApiData

Read (AddrRange IPv4) 
Instance details

Defined in Data.IP.Range

Read (AddrRange IPv6) 
Instance details

Defined in Data.IP.Range

Read (TxId a) 
Instance details

Defined in LndClient.Data.Newtype

Read (Vout a) 
Instance details

Defined in LndClient.Data.Newtype

Read mono => Read (NonNull mono) 
Instance details

Defined in Data.NonNull

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 (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] #

Read (Key Block) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Read (Key LnChan) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Read (Key SwapIntoLn) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Read (Key SwapUtxo) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Read (Key User) Source # 
Instance details

Defined in BtcLsp.Storage.Model

(BackendCompatible b s, Read (BackendKey b)) => Read (BackendKey (Compatible b s)) 
Instance details

Defined in Database.Persist.Compatible.Types

(PersistCore b, PersistCore (RawPostgresql b), Read (BackendKey b)) => Read (BackendKey (RawPostgresql b)) 
Instance details

Defined in Database.Persist.Postgresql

Read a => Read (Single a) 
Instance details

Defined in Database.Persist.Sql.Types

Read a => Read (Array a) 
Instance details

Defined in Data.Primitive.Array

Read a => Read (SmallArray a) 
Instance details

Defined in Data.Primitive.SmallArray

Read a => Read (Result a) 
Instance details

Defined in Codec.QRCode.Data.Result

Read v => Read (Result v) 
Instance details

Defined in Text.Hamlet.Parse

Methods

readsPrec :: Int -> ReadS (Result v) #

readList :: ReadS [Result v] #

readPrec :: ReadPrec (Result v) #

readListPrec :: ReadPrec [Result v] #

Read a => Read (Maybe a) 
Instance details

Defined in Data.Strict.Maybe

(Eq a, Hashable a, Read a) => Read (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Read a => Read (Vector a) 
Instance details

Defined in Data.Vector

(Read a, Prim a) => Read (Vector a) 
Instance details

Defined in Data.Vector.Primitive

(Read a, Storable a) => Read (Vector a) 
Instance details

Defined in Data.Vector.Storable

Read (Route App) Source # 
Instance details

Defined in BtcLsp.Yesod.Foundation

Read (Route Auth) 
Instance details

Defined in Yesod.Auth.Routes

Read (Route LiteApp) 
Instance details

Defined in Yesod.Core.Internal.LiteApp

Read (Route WaiSubsite) 
Instance details

Defined in Yesod.Core.Types

Read (Route WaiSubsiteWithAuth) 
Instance details

Defined in Yesod.Core.Types

Read (Route Static) 
Instance details

Defined in Yesod.Static

Read a => Read (Maybe a)

Since: base-2.1

Instance details

Defined in GHC.Read

Read a => Read (a)

Since: base-4.15

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a) #

readList :: ReadS [(a)] #

readPrec :: ReadPrec (a) #

readListPrec :: ReadPrec [(a)] #

Read a => Read [a]

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS [a] #

readList :: ReadS [[a]] #

readPrec :: ReadPrec [a] #

readListPrec :: ReadPrec [[a]] #

(Read a, Read b) => Read (Either a b)

Since: base-3.0

Instance details

Defined in Data.Either

HasResolution a => Read (Fixed a)

Since: base-4.3.0.0

Instance details

Defined in Data.Fixed

Read (Proxy t)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

(Read a, Read b) => Read (Arg a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

readsPrec :: Int -> ReadS (Arg a b) #

readList :: ReadS [Arg a b] #

readPrec :: ReadPrec (Arg a b) #

readListPrec :: ReadPrec [Arg a b] #

(Ix a, Read a, Read b) => Read (Array a b)

Since: base-2.1

Instance details

Defined in GHC.Read

Read (U1 p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Read (V1 p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

(Ord k, Read k, Read e) => Read (Map k e) 
Instance details

Defined in Data.Map.Internal

Methods

readsPrec :: Int -> ReadS (Map k e) #

readList :: ReadS [Map k e] #

readPrec :: ReadPrec (Map k e) #

readListPrec :: ReadPrec [Map k e] #

(Read a, Read b) => Read (Gr a b) 
Instance details

Defined in Data.Graph.Inductive.PatriciaTree

Methods

readsPrec :: Int -> ReadS (Gr a b) #

readList :: ReadS [Gr a b] #

readPrec :: ReadPrec (Gr a b) #

readListPrec :: ReadPrec [Gr a b] #

(Read1 f, Read a) => Read (Cofree f a) 
Instance details

Defined in Control.Comonad.Cofree

(Read1 f, Read a) => Read (Free f a) 
Instance details

Defined in Control.Monad.Free

Methods

readsPrec :: Int -> ReadS (Free f a) #

readList :: ReadS [Free f a] #

readPrec :: ReadPrec (Free f a) #

readListPrec :: ReadPrec [Free f a] #

(Read a, Read b) => Read (Either a b) 
Instance details

Defined in Data.Strict.Either

(Read a, Read b) => Read (These a b) 
Instance details

Defined in Data.Strict.These

(Read a, Read b) => Read (Pair a b) 
Instance details

Defined in Data.Strict.Tuple

Methods

readsPrec :: Int -> ReadS (Pair a b) #

readList :: ReadS [Pair a b] #

readPrec :: ReadPrec (Pair a b) #

readListPrec :: ReadPrec [Pair a b] #

(Read a, Read b) => Read (These a b) 
Instance details

Defined in Data.These

(Read1 f, Read a) => Read (Lift f a) 
Instance details

Defined in Control.Applicative.Lift

Methods

readsPrec :: Int -> ReadS (Lift f a) #

readList :: ReadS [Lift f a] #

readPrec :: ReadPrec (Lift f a) #

readListPrec :: ReadPrec [Lift f a] #

(Read1 m, Read a) => Read (ListT m a) 
Instance details

Defined in Control.Monad.Trans.List

(Read1 m, Read a) => Read (MaybeT m a) 
Instance details

Defined in Control.Monad.Trans.Maybe

(Eq k, Hashable k, Read k, Read e) => Read (HashMap k e) 
Instance details

Defined in Data.HashMap.Internal

(Read a, Read b) => Read (a, b)

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a, b) #

readList :: ReadS [(a, b)] #

readPrec :: ReadPrec (a, b) #

readListPrec :: ReadPrec [(a, b)] #

Read a => Read (Const a b)

This instance would be equivalent to the derived instances of the Const newtype if the getConst field were removed

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Const

Read (f a) => Read (Ap f a)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

readsPrec :: Int -> ReadS (Ap f a) #

readList :: ReadS [Ap f a] #

readPrec :: ReadPrec (Ap f a) #

readListPrec :: ReadPrec [Ap f a] #

Read (f a) => Read (Alt f a)

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

readsPrec :: Int -> ReadS (Alt f a) #

readList :: ReadS [Alt f a] #

readPrec :: ReadPrec (Alt f a) #

readListPrec :: ReadPrec [Alt f a] #

a ~ b => Read (a :~: b)

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Equality

Methods

readsPrec :: Int -> ReadS (a :~: b) #

readList :: ReadS [a :~: b] #

readPrec :: ReadPrec (a :~: b) #

readListPrec :: ReadPrec [a :~: b] #

Read (f p) => Read (Rec1 f p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

readsPrec :: Int -> ReadS (Rec1 f p) #

readList :: ReadS [Rec1 f p] #

readPrec :: ReadPrec (Rec1 f p) #

readListPrec :: ReadPrec [Rec1 f p] #

Read (p a a) => Read (Join p a) 
Instance details

Defined in Data.Bifunctor.Join

Methods

readsPrec :: Int -> ReadS (Join p a) #

readList :: ReadS [Join p a] #

readPrec :: ReadPrec (Join p a) #

readListPrec :: ReadPrec [Join p a] #

Read (Money owner btcl mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

readsPrec :: Int -> ReadS (Money owner btcl mrel) #

readList :: ReadS [Money owner btcl mrel] #

readPrec :: ReadPrec (Money owner btcl mrel) #

readListPrec :: ReadPrec [Money owner btcl mrel] #

(Read a, Read (f b)) => Read (FreeF f a b) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

readsPrec :: Int -> ReadS (FreeF f a b) #

readList :: ReadS [FreeF f a b] #

readPrec :: ReadPrec (FreeF f a b) #

readListPrec :: ReadPrec [FreeF f a b] #

(Read1 f, Read1 m, Read a) => Read (FreeT f m a) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

readsPrec :: Int -> ReadS (FreeT f m a) #

readList :: ReadS [FreeT f m a] #

readPrec :: ReadPrec (FreeT f m a) #

readListPrec :: ReadPrec [FreeT f m a] #

Read b => Read (Tagged s b) 
Instance details

Defined in Data.Tagged

(Read1 f, Read1 g, Read a) => Read (These1 f g a) 
Instance details

Defined in Data.Functor.These

Methods

readsPrec :: Int -> ReadS (These1 f g a) #

readList :: ReadS [These1 f g a] #

readPrec :: ReadPrec (These1 f g a) #

readListPrec :: ReadPrec [These1 f g a] #

(Read1 f, Read a) => Read (Backwards f a) 
Instance details

Defined in Control.Applicative.Backwards

(Read e, Read1 m, Read a) => Read (ErrorT e m a) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

readsPrec :: Int -> ReadS (ErrorT e m a) #

readList :: ReadS [ErrorT e m a] #

readPrec :: ReadPrec (ErrorT e m a) #

readListPrec :: ReadPrec [ErrorT e m a] #

(Read e, Read1 m, Read a) => Read (ExceptT e m a) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

readsPrec :: Int -> ReadS (ExceptT e m a) #

readList :: ReadS [ExceptT e m a] #

readPrec :: ReadPrec (ExceptT e m a) #

readListPrec :: ReadPrec [ExceptT e m a] #

(Read1 f, Read a) => Read (IdentityT f a) 
Instance details

Defined in Control.Monad.Trans.Identity

(Read w, Read1 m, Read a) => Read (WriterT w m a) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

readsPrec :: Int -> ReadS (WriterT w m a) #

readList :: ReadS [WriterT w m a] #

readPrec :: ReadPrec (WriterT w m a) #

readListPrec :: ReadPrec [WriterT w m a] #

(Read w, Read1 m, Read a) => Read (WriterT w m a) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

readsPrec :: Int -> ReadS (WriterT w m a) #

readList :: ReadS [WriterT w m a] #

readPrec :: ReadPrec (WriterT w m a) #

readListPrec :: ReadPrec [WriterT w m a] #

Read a => Read (Constant a b) 
Instance details

Defined in Data.Functor.Constant

(Read1 f, Read a) => Read (Reverse f a) 
Instance details

Defined in Data.Functor.Reverse

(Read a, Read b, Read c) => Read (a, b, c)

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a, b, c) #

readList :: ReadS [(a, b, c)] #

readPrec :: ReadPrec (a, b, c) #

readListPrec :: ReadPrec [(a, b, c)] #

(Read1 f, Read1 g, Read a) => Read (Product f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Product

Methods

readsPrec :: Int -> ReadS (Product f g a) #

readList :: ReadS [Product f g a] #

readPrec :: ReadPrec (Product f g a) #

readListPrec :: ReadPrec [Product f g a] #

(Read1 f, Read1 g, Read a) => Read (Sum f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Sum

Methods

readsPrec :: Int -> ReadS (Sum f g a) #

readList :: ReadS [Sum f g a] #

readPrec :: ReadPrec (Sum f g a) #

readListPrec :: ReadPrec [Sum f g a] #

a ~~ b => Read (a :~~: b)

Since: base-4.10.0.0

Instance details

Defined in Data.Type.Equality

Methods

readsPrec :: Int -> ReadS (a :~~: b) #

readList :: ReadS [a :~~: b] #

readPrec :: ReadPrec (a :~~: b) #

readListPrec :: ReadPrec [a :~~: b] #

(Read (f p), Read (g p)) => Read ((f :*: g) p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

readsPrec :: Int -> ReadS ((f :*: g) p) #

readList :: ReadS [(f :*: g) p] #

readPrec :: ReadPrec ((f :*: g) p) #

readListPrec :: ReadPrec [(f :*: g) p] #

(Read (f p), Read (g p)) => Read ((f :+: g) p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

readsPrec :: Int -> ReadS ((f :+: g) p) #

readList :: ReadS [(f :+: g) p] #

readPrec :: ReadPrec ((f :+: g) p) #

readListPrec :: ReadPrec [(f :+: g) p] #

Read c => Read (K1 i c p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

readsPrec :: Int -> ReadS (K1 i c p) #

readList :: ReadS [K1 i c p] #

readPrec :: ReadPrec (K1 i c p) #

readListPrec :: ReadPrec [K1 i c p] #

(Read a, Read b, Read c, Read d) => Read (a, b, c, d)

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d) #

readList :: ReadS [(a, b, c, d)] #

readPrec :: ReadPrec (a, b, c, d) #

readListPrec :: ReadPrec [(a, b, c, d)] #

(Read1 f, Read1 g, Read a) => Read (Compose f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

readsPrec :: Int -> ReadS (Compose f g a) #

readList :: ReadS [Compose f g a] #

readPrec :: ReadPrec (Compose f g a) #

readListPrec :: ReadPrec [Compose f g a] #

Read (f (g p)) => Read ((f :.: g) p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

readsPrec :: Int -> ReadS ((f :.: g) p) #

readList :: ReadS [(f :.: g) p] #

readPrec :: ReadPrec ((f :.: g) p) #

readListPrec :: ReadPrec [(f :.: g) p] #

Read (f p) => Read (M1 i c f p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

readsPrec :: Int -> ReadS (M1 i c f p) #

readList :: ReadS [M1 i c f p] #

readPrec :: ReadPrec (M1 i c f p) #

readListPrec :: ReadPrec [M1 i c f p] #

Read (f a) => Read (Clown f a b) 
Instance details

Defined in Data.Bifunctor.Clown

Methods

readsPrec :: Int -> ReadS (Clown f a b) #

readList :: ReadS [Clown f a b] #

readPrec :: ReadPrec (Clown f a b) #

readListPrec :: ReadPrec [Clown f a b] #

Read (p b a) => Read (Flip p a b) 
Instance details

Defined in Data.Bifunctor.Flip

Methods

readsPrec :: Int -> ReadS (Flip p a b) #

readList :: ReadS [Flip p a b] #

readPrec :: ReadPrec (Flip p a b) #

readListPrec :: ReadPrec [Flip p a b] #

Read (g b) => Read (Joker g a b) 
Instance details

Defined in Data.Bifunctor.Joker

Methods

readsPrec :: Int -> ReadS (Joker g a b) #

readList :: ReadS [Joker g a b] #

readPrec :: ReadPrec (Joker g a b) #

readListPrec :: ReadPrec [Joker g a b] #

Read (p a b) => Read (WrappedBifunctor p a b) 
Instance details

Defined in Data.Bifunctor.Wrapped

(Read a, Read b, Read c, Read d, Read e) => Read (a, b, c, d, e)

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d, e) #

readList :: ReadS [(a, b, c, d, e)] #

readPrec :: ReadPrec (a, b, c, d, e) #

readListPrec :: ReadPrec [(a, b, c, d, e)] #

(Read (f a b), Read (g a b)) => Read (Product f g a b) 
Instance details

Defined in Data.Bifunctor.Product

Methods

readsPrec :: Int -> ReadS (Product f g a b) #

readList :: ReadS [Product f g a b] #

readPrec :: ReadPrec (Product f g a b) #

readListPrec :: ReadPrec [Product f g a b] #

(Read (p a b), Read (q a b)) => Read (Sum p q a b) 
Instance details

Defined in Data.Bifunctor.Sum

Methods

readsPrec :: Int -> ReadS (Sum p q a b) #

readList :: ReadS [Sum p q a b] #

readPrec :: ReadPrec (Sum p q a b) #

readListPrec :: ReadPrec [Sum p q a b] #

(Read a, Read b, Read c, Read d, Read e, Read f) => Read (a, b, c, d, e, f)

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d, e, f) #

readList :: ReadS [(a, b, c, d, e, f)] #

readPrec :: ReadPrec (a, b, c, d, e, f) #

readListPrec :: ReadPrec [(a, b, c, d, e, f)] #

Read (f (p a b)) => Read (Tannen f p a b) 
Instance details

Defined in Data.Bifunctor.Tannen

Methods

readsPrec :: Int -> ReadS (Tannen f p a b) #

readList :: ReadS [Tannen f p a b] #

readPrec :: ReadPrec (Tannen f p a b) #

readListPrec :: ReadPrec [Tannen f p a b] #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g) => Read (a, b, c, d, e, f, g)

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d, e, f, g) #

readList :: ReadS [(a, b, c, d, e, f, g)] #

readPrec :: ReadPrec (a, b, c, d, e, f, g) #

readListPrec :: ReadPrec [(a, b, c, d, e, f, g)] #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h) => Read (a, b, c, d, e, f, g, h)

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d, e, f, g, h) #

readList :: ReadS [(a, b, c, d, e, f, g, h)] #

readPrec :: ReadPrec (a, b, c, d, e, f, g, h) #

readListPrec :: ReadPrec [(a, b, c, d, e, f, g, h)] #

Read (p (f a) (g b)) => Read (Biff p f g a b) 
Instance details

Defined in Data.Bifunctor.Biff

Methods

readsPrec :: Int -> ReadS (Biff p f g a b) #

readList :: ReadS [Biff p f g a b] #

readPrec :: ReadPrec (Biff p f g a b) #

readListPrec :: ReadPrec [Biff p f g a b] #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i) => Read (a, b, c, d, e, f, g, h, i)

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d, e, f, g, h, i) #

readList :: ReadS [(a, b, c, d, e, f, g, h, i)] #

readPrec :: ReadPrec (a, b, c, d, e, f, g, h, i) #

readListPrec :: ReadPrec [(a, b, c, d, e, f, g, h, i)] #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j) => Read (a, b, c, d, e, f, g, h, i, j)

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d, e, f, g, h, i, j) #

readList :: ReadS [(a, b, c, d, e, f, g, h, i, j)] #

readPrec :: ReadPrec (a, b, c, d, e, f, g, h, i, j) #

readListPrec :: ReadPrec [(a, b, c, d, e, f, g, h, i, j)] #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j, Read k) => Read (a, b, c, d, e, f, g, h, i, j, k)

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d, e, f, g, h, i, j, k) #

readList :: ReadS [(a, b, c, d, e, f, g, h, i, j, k)] #

readPrec :: ReadPrec (a, b, c, d, e, f, g, h, i, j, k) #

readListPrec :: ReadPrec [(a, b, c, d, e, f, g, h, i, j, k)] #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j, Read k, Read l) => Read (a, b, c, d, e, f, g, h, i, j, k, l)

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d, e, f, g, h, i, j, k, l) #

readList :: ReadS [(a, b, c, d, e, f, g, h, i, j, k, l)] #

readPrec :: ReadPrec (a, b, c, d, e, f, g, h, i, j, k, l) #

readListPrec :: ReadPrec [(a, b, c, d, e, f, g, h, i, j, k, l)] #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j, Read k, Read l, Read m) => Read (a, b, c, d, e, f, g, h, i, j, k, l, m)

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d, e, f, g, h, i, j, k, l, m) #

readList :: ReadS [(a, b, c, d, e, f, g, h, i, j, k, l, m)] #

readPrec :: ReadPrec (a, b, c, d, e, f, g, h, i, j, k, l, m) #

readListPrec :: ReadPrec [(a, b, c, d, e, f, g, h, i, j, k, l, m)] #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j, Read k, Read l, Read m, Read n) => Read (a, b, c, d, e, f, g, h, i, j, k, l, m, n)

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d, e, f, g, h, i, j, k, l, m, n) #

readList :: ReadS [(a, b, c, d, e, f, g, h, i, j, k, l, m, n)] #

readPrec :: ReadPrec (a, b, c, d, e, f, g, h, i, j, k, l, m, n) #

readListPrec :: ReadPrec [(a, b, c, d, e, f, g, h, i, j, k, l, m, n)] #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j, Read k, Read l, Read m, Read n, Read o) => Read (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) #

readList :: ReadS [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)] #

readPrec :: ReadPrec (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) #

readListPrec :: ReadPrec [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)] #

class (Num a, Ord a) => Real a where #

Methods

toRational :: a -> Rational #

the rational equivalent of its real argument with full precision

Instances

Instances details
Real CBool 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CBool -> Rational #

Real CChar 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CChar -> Rational #

Real CClock 
Instance details

Defined in Foreign.C.Types

Real CDouble 
Instance details

Defined in Foreign.C.Types

Real CFloat 
Instance details

Defined in Foreign.C.Types

Real CInt 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CInt -> Rational #

Real CIntMax 
Instance details

Defined in Foreign.C.Types

Real CIntPtr 
Instance details

Defined in Foreign.C.Types

Real CLLong 
Instance details

Defined in Foreign.C.Types

Real CLong 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CLong -> Rational #

Real CPtrdiff 
Instance details

Defined in Foreign.C.Types

Real CSChar 
Instance details

Defined in Foreign.C.Types

Real CSUSeconds 
Instance details

Defined in Foreign.C.Types

Real CShort 
Instance details

Defined in Foreign.C.Types

Real CSigAtomic 
Instance details

Defined in Foreign.C.Types

Real CSize 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CSize -> Rational #

Real CTime 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CTime -> Rational #

Real CUChar 
Instance details

Defined in Foreign.C.Types

Real CUInt 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CUInt -> Rational #

Real CUIntMax 
Instance details

Defined in Foreign.C.Types

Real CUIntPtr 
Instance details

Defined in Foreign.C.Types

Real CULLong 
Instance details

Defined in Foreign.C.Types

Real CULong 
Instance details

Defined in Foreign.C.Types

Real CUSeconds 
Instance details

Defined in Foreign.C.Types

Real CUShort 
Instance details

Defined in Foreign.C.Types

Real CWchar 
Instance details

Defined in Foreign.C.Types

Real Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

toRational :: Int16 -> Rational #

Real Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

toRational :: Int32 -> Rational #

Real Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

toRational :: Int64 -> Rational #

Real Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

toRational :: Int8 -> Rational #

Real Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Real Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Real Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Real CBlkCnt 
Instance details

Defined in System.Posix.Types

Real CBlkSize 
Instance details

Defined in System.Posix.Types

Real CCc 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CCc -> Rational #

Real CClockId 
Instance details

Defined in System.Posix.Types

Real CDev 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CDev -> Rational #

Real CFsBlkCnt 
Instance details

Defined in System.Posix.Types

Real CFsFilCnt 
Instance details

Defined in System.Posix.Types

Real CGid 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CGid -> Rational #

Real CId 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CId -> Rational #

Real CIno 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CIno -> Rational #

Real CKey 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CKey -> Rational #

Real CMode 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CMode -> Rational #

Real CNfds 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CNfds -> Rational #

Real CNlink 
Instance details

Defined in System.Posix.Types

Real COff 
Instance details

Defined in System.Posix.Types

Methods

toRational :: COff -> Rational #

Real CPid 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CPid -> Rational #

Real CRLim 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CRLim -> Rational #

Real CSocklen 
Instance details

Defined in System.Posix.Types

Real CSpeed 
Instance details

Defined in System.Posix.Types

Real CSsize 
Instance details

Defined in System.Posix.Types

Real CTcflag 
Instance details

Defined in System.Posix.Types

Real CUid 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CUid -> Rational #

Real Fd 
Instance details

Defined in System.Posix.Types

Methods

toRational :: Fd -> Rational #

Real GCPort Source # 
Instance details

Defined in BtcLsp.Grpc.Client.LowLevel

Real TimeSpec 
Instance details

Defined in System.Clock

Real Seconds 
Instance details

Defined in LndClient.Data.Newtype

Methods

toRational :: Seconds -> Rational #

Real PortNumber 
Instance details

Defined in Network.Socket.Types

Real Scientific

WARNING: toRational needs to compute the Integer magnitude: 10^e. If applied to a huge exponent this could fill up all space and crash your program!

Avoid applying toRational (or realToFrac) to scientific numbers coming from an untrusted source and use toRealFloat instead. The latter guards against excessive space usage.

Instance details

Defined in Data.Scientific

Real DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Real NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Real Int128 
Instance details

Defined in Data.WideWord.Int128

Real Word128 
Instance details

Defined in Data.WideWord.Word128

Real Word256 
Instance details

Defined in Data.WideWord.Word256

Real Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Methods

toRational :: Word8 -> 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 Int

Since: base-2.0.1

Instance details

Defined in GHC.Real

Methods

toRational :: Int -> Rational #

Real Word

Since: base-2.1

Instance details

Defined in GHC.Real

Methods

toRational :: Word -> Rational #

Real a => Real (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

toRational :: Identity a -> Rational #

Real a => Real (Down a)

Since: base-4.14.0.0

Instance details

Defined in Data.Ord

Methods

toRational :: Down a -> Rational #

Integral a => Real (Ratio a)

Since: base-2.0.1

Instance details

Defined in GHC.Real

Methods

toRational :: Ratio a -> Rational #

(BackendCompatible b s, Real (BackendKey b)) => Real (BackendKey (Compatible b s)) 
Instance details

Defined in Database.Persist.Compatible.Types

(PersistCore b, PersistCore (RawPostgresql b), Real (BackendKey b)) => Real (BackendKey (RawPostgresql b)) 
Instance details

Defined in Database.Persist.Postgresql

HasResolution a => Real (Fixed a)

Since: base-2.1

Instance details

Defined in Data.Fixed

Methods

toRational :: Fixed 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

Instances details
RealFrac CDouble 
Instance details

Defined in Foreign.C.Types

Methods

properFraction :: Integral b => CDouble -> (b, CDouble) #

truncate :: Integral b => CDouble -> b #

round :: Integral b => CDouble -> b #

ceiling :: Integral b => CDouble -> b #

floor :: Integral b => CDouble -> b #

RealFrac CFloat 
Instance details

Defined in Foreign.C.Types

Methods

properFraction :: Integral b => CFloat -> (b, CFloat) #

truncate :: Integral b => CFloat -> b #

round :: Integral b => CFloat -> b #

ceiling :: Integral b => CFloat -> b #

floor :: Integral b => CFloat -> b #

RealFrac Scientific

WARNING: the methods of the RealFrac instance need to compute the magnitude 10^e. If applied to a huge exponent this could take a long time. Even worse, when the destination type is unbounded (i.e. Integer) it could fill up all space and crash your program!

Instance details

Defined in Data.Scientific

RealFrac DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Methods

properFraction :: Integral b => DiffTime -> (b, DiffTime) #

truncate :: Integral b => DiffTime -> b #

round :: Integral b => DiffTime -> b #

ceiling :: Integral b => DiffTime -> b #

floor :: Integral b => DiffTime -> b #

RealFrac NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

RealFrac a => RealFrac (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

properFraction :: Integral b => Identity a -> (b, Identity a) #

truncate :: Integral b => Identity a -> b #

round :: Integral b => Identity a -> b #

ceiling :: Integral b => Identity a -> b #

floor :: Integral b => Identity a -> b #

RealFrac a => RealFrac (Down a)

Since: base-4.14.0.0

Instance details

Defined in Data.Ord

Methods

properFraction :: Integral b => Down a -> (b, Down a) #

truncate :: Integral b => Down a -> b #

round :: Integral b => Down a -> b #

ceiling :: Integral b => Down a -> b #

floor :: Integral b => Down a -> b #

Integral a => RealFrac (Ratio a)

Since: base-2.0.1

Instance details

Defined in GHC.Real

Methods

properFraction :: Integral b => Ratio a -> (b, Ratio a) #

truncate :: Integral b => Ratio a -> b #

round :: Integral b => Ratio a -> b #

ceiling :: Integral b => Ratio a -> b #

floor :: Integral b => Ratio a -> b #

HasResolution a => RealFrac (Fixed a)

Since: base-2.1

Instance details

Defined in Data.Fixed

Methods

properFraction :: Integral b => Fixed a -> (b, Fixed a) #

truncate :: Integral b => Fixed a -> b #

round :: Integral b => Fixed a -> b #

ceiling :: Integral b => Fixed a -> b #

floor :: Integral b => Fixed 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

Instances details
Show PixelCMYK16 
Instance details

Defined in Codec.Picture.Types

Show PixelCMYK8 
Instance details

Defined in Codec.Picture.Types

Show PixelRGB16 
Instance details

Defined in Codec.Picture.Types

Show PixelRGB8 
Instance details

Defined in Codec.Picture.Types

Show PixelRGBA16 
Instance details

Defined in Codec.Picture.Types

Show PixelRGBA8 
Instance details

Defined in Codec.Picture.Types

Show PixelRGBF 
Instance details

Defined in Codec.Picture.Types

Show PixelYA16 
Instance details

Defined in Codec.Picture.Types

Show PixelYA8 
Instance details

Defined in Codec.Picture.Types

Show PixelYCbCr8 
Instance details

Defined in Codec.Picture.Types

Show PixelYCbCrK8 
Instance details

Defined in Codec.Picture.Types

Show DotNetTime 
Instance details

Defined in Data.Aeson.Types.Internal

Show JSONPathElement 
Instance details

Defined in Data.Aeson.Types.Internal

Show Options 
Instance details

Defined in Data.Aeson.Types.Internal

Show SumEncoding 
Instance details

Defined in Data.Aeson.Types.Internal

Show Value

Since version 1.5.6.0 version object values are printed in lexicographic key order

>>> toJSON $ H.fromList [("a", True), ("z", False)]
Object (fromList [("a",Bool True),("z",Bool False)])
>>> toJSON $ H.fromList [("z", False), ("a", True)]
Object (fromList [("a",Bool True),("z",Bool False)])
Instance details

Defined in Data.Aeson.Types.Internal

Methods

showsPrec :: Int -> Value -> ShowS #

show :: Value -> String #

showList :: [Value] -> ShowS #

Show AsyncCancelled 
Instance details

Defined in Control.Concurrent.Async

Show ExceptionInLinkedThread 
Instance details

Defined in Control.Concurrent.Async

Show More 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

showsPrec :: Int -> More -> ShowS #

show :: More -> String #

showList :: [More] -> ShowS #

Show Pos 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

showsPrec :: Int -> Pos -> ShowS #

show :: Pos -> String #

showList :: [Pos] -> ShowS #

Show All

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

showsPrec :: Int -> All -> ShowS #

show :: All -> String #

showList :: [All] -> ShowS #

Show Any

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

showsPrec :: Int -> Any -> ShowS #

show :: Any -> String #

showList :: [Any] -> ShowS #

Show SomeTypeRep

Since: base-4.10.0.0

Instance details

Defined in Data.Typeable.Internal

Show Version

Since: base-2.1

Instance details

Defined in Data.Version

Show Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Methods

showsPrec :: Int -> Void -> ShowS #

show :: Void -> String #

showList :: [Void] -> ShowS #

Show CBool 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CBool -> ShowS #

show :: CBool -> String #

showList :: [CBool] -> ShowS #

Show CChar 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CChar -> ShowS #

show :: CChar -> String #

showList :: [CChar] -> ShowS #

Show CClock 
Instance details

Defined in Foreign.C.Types

Show CDouble 
Instance details

Defined in Foreign.C.Types

Show CFloat 
Instance details

Defined in Foreign.C.Types

Show CInt 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CInt -> ShowS #

show :: CInt -> String #

showList :: [CInt] -> ShowS #

Show CIntMax 
Instance details

Defined in Foreign.C.Types

Show CIntPtr 
Instance details

Defined in Foreign.C.Types

Show CLLong 
Instance details

Defined in Foreign.C.Types

Show CLong 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CLong -> ShowS #

show :: CLong -> String #

showList :: [CLong] -> ShowS #

Show CPtrdiff 
Instance details

Defined in Foreign.C.Types

Show CSChar 
Instance details

Defined in Foreign.C.Types

Show CSUSeconds 
Instance details

Defined in Foreign.C.Types

Show CShort 
Instance details

Defined in Foreign.C.Types

Show CSigAtomic 
Instance details

Defined in Foreign.C.Types

Show CSize 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CSize -> ShowS #

show :: CSize -> String #

showList :: [CSize] -> ShowS #

Show CTime 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CTime -> ShowS #

show :: CTime -> String #

showList :: [CTime] -> ShowS #

Show CUChar 
Instance details

Defined in Foreign.C.Types

Show CUInt 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CUInt -> ShowS #

show :: CUInt -> String #

showList :: [CUInt] -> ShowS #

Show CUIntMax 
Instance details

Defined in Foreign.C.Types

Show CUIntPtr 
Instance details

Defined in Foreign.C.Types

Show CULLong 
Instance details

Defined in Foreign.C.Types

Show CULong 
Instance details

Defined in Foreign.C.Types

Show CUSeconds 
Instance details

Defined in Foreign.C.Types

Show CUShort 
Instance details

Defined in Foreign.C.Types

Show CWchar 
Instance details

Defined in Foreign.C.Types

Show BlockReason

Since: base-4.3.0.0

Instance details

Defined in GHC.Conc.Sync

Show ThreadId

Since: base-4.2.0.0

Instance details

Defined in GHC.Conc.Sync

Show ThreadStatus

Since: base-4.3.0.0

Instance details

Defined in GHC.Conc.Sync

Show 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 SomeException

Since: base-3.0

Instance details

Defined in GHC.Exception.Type

Show Associativity

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Show DecidedStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Show Fixity

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Show SourceStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Show SourceUnpackedness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Show MaskingState

Since: base-4.3.0.0

Instance details

Defined in GHC.IO

Show SeekMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Device

Show AllocationLimitExceeded

Since: base-4.7.1.0

Instance details

Defined in GHC.IO.Exception

Show ArrayException

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Show AssertionFailed

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Show AsyncException

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Show BlockedIndefinitelyOnMVar

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Show BlockedIndefinitelyOnSTM

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Show CompactionFailed

Since: base-4.10.0.0

Instance details

Defined in GHC.IO.Exception

Show Deadlock

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Show ExitCode 
Instance details

Defined in GHC.IO.Exception

Show FixIOException

Since: base-4.11.0.0

Instance details

Defined in GHC.IO.Exception

Show IOErrorType

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Show IOException

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Show SomeAsyncException

Since: base-4.7.0.0

Instance details

Defined in GHC.IO.Exception

Show BufferMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Handle.Types

Show Handle

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Handle.Types

Show HandleType

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Handle.Types

Show Newline

Since: base-4.3.0.0

Instance details

Defined in GHC.IO.Handle.Types

Show NewlineMode

Since: base-4.3.0.0

Instance details

Defined in GHC.IO.Handle.Types

Show IOMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.IOMode

Show Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

showsPrec :: Int -> Int16 -> ShowS #

show :: Int16 -> String #

showList :: [Int16] -> ShowS #

Show Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

showsPrec :: Int -> Int32 -> ShowS #

show :: Int32 -> String #

showList :: [Int32] -> ShowS #

Show Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

showsPrec :: Int -> Int64 -> ShowS #

show :: Int64 -> String #

showList :: [Int64] -> ShowS #

Show Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

showsPrec :: Int -> Int8 -> ShowS #

show :: Int8 -> String #

showList :: [Int8] -> ShowS #

Show CCFlags

Since: base-4.8.0.0

Instance details

Defined in GHC.RTS.Flags

Show ConcFlags

Since: base-4.8.0.0

Instance details

Defined in GHC.RTS.Flags

Show DebugFlags

Since: base-4.8.0.0

Instance details

Defined in GHC.RTS.Flags

Show DoCostCentres

Since: base-4.8.0.0

Instance details

Defined in GHC.RTS.Flags

Show DoHeapProfile

Since: base-4.8.0.0

Instance details

Defined in GHC.RTS.Flags

Show DoTrace

Since: base-4.8.0.0

Instance details

Defined in GHC.RTS.Flags

Show GCFlags

Since: base-4.8.0.0

Instance details

Defined in GHC.RTS.Flags

Show GiveGCStats

Since: base-4.8.0.0

Instance details

Defined in GHC.RTS.Flags

Show IoSubSystem 
Instance details

Defined in GHC.RTS.Flags

Show MiscFlags

Since: base-4.8.0.0

Instance details

Defined in GHC.RTS.Flags

Show ParFlags

Since: base-4.8.0.0

Instance details

Defined in GHC.RTS.Flags

Show ProfFlags

Since: base-4.8.0.0

Instance details

Defined in GHC.RTS.Flags

Show RTSFlags

Since: base-4.8.0.0

Instance details

Defined in GHC.RTS.Flags

Show TickyFlags

Since: base-4.8.0.0

Instance details

Defined in GHC.RTS.Flags

Show TraceFlags

Since: base-4.8.0.0

Instance details

Defined in GHC.RTS.Flags

Show CallStack

Since: base-4.9.0.0

Instance details

Defined in GHC.Show

Show SrcLoc

Since: base-4.9.0.0

Instance details

Defined in GHC.Show

Show GCDetails

Since: base-4.10.0.0

Instance details

Defined in GHC.Stats

Show RTSStats

Since: base-4.10.0.0

Instance details

Defined in GHC.Stats

Show 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 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 CBlkCnt 
Instance details

Defined in System.Posix.Types

Show CBlkSize 
Instance details

Defined in System.Posix.Types

Show CCc 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CCc -> ShowS #

show :: CCc -> String #

showList :: [CCc] -> ShowS #

Show CClockId 
Instance details

Defined in System.Posix.Types

Show CDev 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CDev -> ShowS #

show :: CDev -> String #

showList :: [CDev] -> ShowS #

Show CFsBlkCnt 
Instance details

Defined in System.Posix.Types

Show CFsFilCnt 
Instance details

Defined in System.Posix.Types

Show CGid 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CGid -> ShowS #

show :: CGid -> String #

showList :: [CGid] -> ShowS #

Show CId 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CId -> ShowS #

show :: CId -> String #

showList :: [CId] -> ShowS #

Show CIno 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CIno -> ShowS #

show :: CIno -> String #

showList :: [CIno] -> ShowS #

Show CKey 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CKey -> ShowS #

show :: CKey -> String #

showList :: [CKey] -> ShowS #

Show CMode 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CMode -> ShowS #

show :: CMode -> String #

showList :: [CMode] -> ShowS #

Show CNfds 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CNfds -> ShowS #

show :: CNfds -> String #

showList :: [CNfds] -> ShowS #

Show CNlink 
Instance details

Defined in System.Posix.Types

Show COff 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> COff -> ShowS #

show :: COff -> String #

showList :: [COff] -> ShowS #

Show CPid 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CPid -> ShowS #

show :: CPid -> String #

showList :: [CPid] -> ShowS #

Show CRLim 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CRLim -> ShowS #

show :: CRLim -> String #

showList :: [CRLim] -> ShowS #

Show CSocklen 
Instance details

Defined in System.Posix.Types

Show CSpeed 
Instance details

Defined in System.Posix.Types

Show CSsize 
Instance details

Defined in System.Posix.Types

Show CTcflag 
Instance details

Defined in System.Posix.Types

Show CTimer 
Instance details

Defined in System.Posix.Types

Show CUid 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CUid -> ShowS #

show :: CUid -> String #

showList :: [CUid] -> ShowS #

Show Fd 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> Fd -> ShowS #

show :: Fd -> String #

showList :: [Fd] -> ShowS #

Show 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 Encoding 
Instance details

Defined in Basement.String

Show ASCII7_Invalid 
Instance details

Defined in Basement.String.Encoding.ASCII7

Methods

showsPrec :: Int -> ASCII7_Invalid -> ShowS #

show :: ASCII7_Invalid -> String #

showList :: [ASCII7_Invalid] -> ShowS #

Show ISO_8859_1_Invalid 
Instance details

Defined in Basement.String.Encoding.ISO_8859_1

Methods

showsPrec :: Int -> ISO_8859_1_Invalid -> ShowS #

show :: ISO_8859_1_Invalid -> String #

showList :: [ISO_8859_1_Invalid] -> ShowS #

Show UTF16_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF16

Methods

showsPrec :: Int -> UTF16_Invalid -> ShowS #

show :: UTF16_Invalid -> String #

showList :: [UTF16_Invalid] -> ShowS #

Show UTF32_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF32

Methods

showsPrec :: Int -> UTF32_Invalid -> ShowS #

show :: UTF32_Invalid -> String #

showList :: [UTF32_Invalid] -> ShowS #

Show FileSize 
Instance details

Defined in Basement.Types.OffsetSize

Show String 
Instance details

Defined in Basement.UTF8.Base

Show BitcoinLayer Source # 
Instance details

Defined in BtcLsp.Data.Kind

Show Direction Source # 
Instance details

Defined in BtcLsp.Data.Kind

Show MoneyRelation Source # 
Instance details

Defined in BtcLsp.Data.Kind

Show Owner Source # 
Instance details

Defined in BtcLsp.Data.Kind

Methods

showsPrec :: Int -> Owner -> ShowS #

show :: Owner -> String #

showList :: [Owner] -> ShowS #

Show Table Source # 
Instance details

Defined in BtcLsp.Data.Kind

Methods

showsPrec :: Int -> Table -> ShowS #

show :: Table -> String #

showList :: [Table] -> ShowS #

Show BlkHash Source # 
Instance details

Defined in BtcLsp.Data.Type

Show BlkHeight Source # 
Instance details

Defined in BtcLsp.Data.Type

Show BlkStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Show Failure Source # 
Instance details

Defined in BtcLsp.Data.Type

Show FailureInput Source # 
Instance details

Defined in BtcLsp.Data.Type

Show FailureInternal Source # 
Instance details

Defined in BtcLsp.Data.Type

Show FeeRate Source # 
Instance details

Defined in BtcLsp.Data.Type

Show LnChanStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Show LnInvoiceStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Show MicroSeconds Source # 
Instance details

Defined in BtcLsp.Data.Type

Show NodePubKeyHex Source # 
Instance details

Defined in BtcLsp.Data.Type

Show NodeUri Source # 
Instance details

Defined in BtcLsp.Data.Type

Show NodeUriHex Source # 
Instance details

Defined in BtcLsp.Data.Type

Show Nonce Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

showsPrec :: Int -> Nonce -> ShowS #

show :: Nonce -> String #

showList :: [Nonce] -> ShowS #

Show Privacy Source # 
Instance details

Defined in BtcLsp.Data.Type

Show PsbtUtxo Source # 
Instance details

Defined in BtcLsp.Data.Type

Show RHashHex Source # 
Instance details

Defined in BtcLsp.Data.Type

Show RowQty Source # 
Instance details

Defined in BtcLsp.Data.Type

Show Seconds Source # 
Instance details

Defined in BtcLsp.Data.Type

Show SocketAddress Source # 
Instance details

Defined in BtcLsp.Data.Type

Show SwapHash Source # 
Instance details

Defined in BtcLsp.Data.Type

Show SwapStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Show SwapUtxoStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Show UtxoLockId Source # 
Instance details

Defined in BtcLsp.Data.Type

Show Vbyte Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

showsPrec :: Int -> Vbyte -> ShowS #

show :: Vbyte -> String #

showList :: [Vbyte] -> ShowS #

Show YesodLog Source # 
Instance details

Defined in BtcLsp.Data.Type

Show GCPort Source # 
Instance details

Defined in BtcLsp.Grpc.Client.LowLevel

Show Encryption Source # 
Instance details

Defined in BtcLsp.Grpc.Data

Show SigHeaderName Source # 
Instance details

Defined in BtcLsp.Grpc.Data

Show LndSig Source # 
Instance details

Defined in BtcLsp.Grpc.Sig

Show MsgToSign Source # 
Instance details

Defined in BtcLsp.Grpc.Sig

Show InQty Source # 
Instance details

Defined in BtcLsp.Math.OnChain

Methods

showsPrec :: Int -> InQty -> ShowS #

show :: InQty -> String #

showList :: [InQty] -> ShowS #

Show OutQty Source # 
Instance details

Defined in BtcLsp.Math.OnChain

Show SatPerVbyte Source # 
Instance details

Defined in BtcLsp.Math.OnChain

Show SwapCap Source # 
Instance details

Defined in BtcLsp.Math.Swap

Show Block Source # 
Instance details

Defined in BtcLsp.Storage.Model

Methods

showsPrec :: Int -> Block -> ShowS #

show :: Block -> String #

showList :: [Block] -> ShowS #

Show LnChan Source # 
Instance details

Defined in BtcLsp.Storage.Model

Show SwapIntoLn Source # 
Instance details

Defined in BtcLsp.Storage.Model

Show SwapUtxo Source # 
Instance details

Defined in BtcLsp.Storage.Model

Show User Source # 
Instance details

Defined in BtcLsp.Storage.Model

Methods

showsPrec :: Int -> User -> ShowS #

show :: User -> String #

showList :: [User] -> ShowS #

Show SwapInfo Source # 
Instance details

Defined in BtcLsp.Storage.Model.SwapIntoLn

Show UtxoInfo Source # 
Instance details

Defined in BtcLsp.Storage.Model.SwapIntoLn

Show Utxo Source # 
Instance details

Defined in BtcLsp.Thread.BlockScanner

Methods

showsPrec :: Int -> Utxo -> ShowS #

show :: Utxo -> String #

showList :: [Utxo] -> ShowS #

Show BootstrapColor Source # 
Instance details

Defined in BtcLsp.Yesod.Data.BootstrapColor

Show Code Source # 
Instance details

Defined in BtcLsp.Yesod.Data.Language

Methods

showsPrec :: Int -> Code -> ShowS #

show :: Code -> String #

showList :: [Code] -> ShowS #

Show HtmlClassAttr Source # 
Instance details

Defined in BtcLsp.Yesod.Data.Widget

Show Layout Source # 
Instance details

Defined in BtcLsp.Yesod.Data.Widget

Show Ctx Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

showsPrec :: Int -> Ctx -> ShowS #

show :: Ctx -> String #

showList :: [Ctx] -> ShowS #

Show FeeMoney Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Show FeeRate Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Show FieldIndex Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Show FundLnHodlInvoice Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Show FundLnInvoice Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Show FundMoney Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Show FundOnChainAddress Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Show InputFailure Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Show InputFailureKind Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Show InputFailureKind'UnrecognizedValue Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Show InternalFailure Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Show InternalFailure'Either Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Show LnHost Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Show LnPeer Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Show LnPort Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Show LnPubKey Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Show LocalBalance Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Show Nonce Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

showsPrec :: Int -> Nonce -> ShowS #

show :: Nonce -> String #

showList :: [Nonce] -> ShowS #

Show Privacy Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Show Privacy'UnrecognizedValue Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Show RefundMoney Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Show RefundOnChainAddress Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Show RemoteBalance Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Show LnHodlInvoice Source # 
Instance details

Defined in Proto.BtcLsp.Data.LowLevel

Show LnInvoice Source # 
Instance details

Defined in Proto.BtcLsp.Data.LowLevel

Show Msat Source # 
Instance details

Defined in Proto.BtcLsp.Data.LowLevel

Methods

showsPrec :: Int -> Msat -> ShowS #

show :: Msat -> String #

showList :: [Msat] -> ShowS #

Show OnChainAddress Source # 
Instance details

Defined in Proto.BtcLsp.Data.LowLevel

Show Urational Source # 
Instance details

Defined in Proto.BtcLsp.Data.LowLevel

Show Request Source # 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Show Response Source # 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Show Response'Either Source # 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Show Response'Failure Source # 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Show Response'Failure'InputFailure Source # 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Show Response'Failure'InputFailure'UnrecognizedValue Source # 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Show Response'Success Source # 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Show Request Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Show Response Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Show Response'Either Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Show Response'Failure Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Show Response'Failure'InputFailure Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Show Response'Failure'InputFailure'UnrecognizedValue Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Show Response'Success Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Show Request Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Show Response Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Show Response'Either Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Show Response'Failure Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Show Response'Failure'InputFailure Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Show Response'Failure'InputFailure'UnrecognizedValue Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Show Response'Success Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Show Bytes 
Instance details

Defined in Data.Bytes.Internal

Methods

showsPrec :: Int -> Bytes -> ShowS #

show :: Bytes -> String #

showList :: [Bytes] -> ShowS #

Show ByteString 
Instance details

Defined in Data.ByteString.Internal

Show ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Show ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Show Date 
Instance details

Defined in Chronos

Methods

showsPrec :: Int -> Date -> ShowS #

show :: Date -> String #

showList :: [Date] -> ShowS #

Show Datetime 
Instance details

Defined in Chronos

Show DatetimeFormat 
Instance details

Defined in Chronos

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

Show DayOfWeek 
Instance details

Defined in Chronos

Show DayOfYear 
Instance details

Defined in Chronos

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

Show Offset 
Instance details

Defined in Chronos

Show OffsetDatetime 
Instance details

Defined in Chronos

Show OffsetFormat 
Instance details

Defined in Chronos

Show OrdinalDate 
Instance details

Defined in Chronos

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

Show TimeOfDay 
Instance details

Defined in Chronos

Show TimeParts 
Instance details

Defined in Chronos

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 IV 
Instance details

Defined in Web.ClientSession

Methods

showsPrec :: Int -> IV -> ShowS #

show :: IV -> String #

showList :: [IV] -> ShowS #

Show Key

Dummy Show instance.

Instance details

Defined in Web.ClientSession

Methods

showsPrec :: Int -> Key -> ShowS #

show :: Key -> String #

showList :: [Key] -> ShowS #

Show Clock 
Instance details

Defined in System.Clock

Methods

showsPrec :: Int -> Clock -> ShowS #

show :: Clock -> String #

showList :: [Clock] -> ShowS #

Show TimeSpec 
Instance details

Defined in System.Clock

Show IntSet 
Instance details

Defined in Data.IntSet.Internal

Show Relation 
Instance details

Defined in Data.IntSet.Internal

Methods

showsPrec :: Int -> Relation -> ShowS #

show :: Relation -> String #

showList :: [Relation] -> ShowS #

Show SameSiteOption 
Instance details

Defined in Web.Cookie

Show SetCookie 
Instance details

Defined in Web.Cookie

Show Curve_Edwards25519 
Instance details

Defined in Crypto.ECC

Show Curve_P256R1 
Instance details

Defined in Crypto.ECC

Show Curve_P384R1 
Instance details

Defined in Crypto.ECC

Show Curve_P521R1 
Instance details

Defined in Crypto.ECC

Show Curve_X25519 
Instance details

Defined in Crypto.ECC

Show Curve_X448 
Instance details

Defined in Crypto.ECC

Show CryptoError 
Instance details

Defined in Crypto.Error.Types

Show Blake2b_160 
Instance details

Defined in Crypto.Hash.Blake2b

Show Blake2b_224 
Instance details

Defined in Crypto.Hash.Blake2b

Show Blake2b_256 
Instance details

Defined in Crypto.Hash.Blake2b

Show Blake2b_384 
Instance details

Defined in Crypto.Hash.Blake2b

Show Blake2b_512 
Instance details

Defined in Crypto.Hash.Blake2b

Show Blake2bp_512 
Instance details

Defined in Crypto.Hash.Blake2bp

Show Blake2s_160 
Instance details

Defined in Crypto.Hash.Blake2s

Show Blake2s_224 
Instance details

Defined in Crypto.Hash.Blake2s

Show Blake2s_256 
Instance details

Defined in Crypto.Hash.Blake2s

Show Blake2sp_224 
Instance details

Defined in Crypto.Hash.Blake2sp

Show Blake2sp_256 
Instance details

Defined in Crypto.Hash.Blake2sp

Show Keccak_224 
Instance details

Defined in Crypto.Hash.Keccak

Show Keccak_256 
Instance details

Defined in Crypto.Hash.Keccak

Show Keccak_384 
Instance details

Defined in Crypto.Hash.Keccak

Show Keccak_512 
Instance details

Defined in Crypto.Hash.Keccak

Show MD2 
Instance details

Defined in Crypto.Hash.MD2

Methods

showsPrec :: Int -> MD2 -> ShowS #

show :: MD2 -> String #

showList :: [MD2] -> ShowS #

Show MD4 
Instance details

Defined in Crypto.Hash.MD4

Methods

showsPrec :: Int -> MD4 -> ShowS #

show :: MD4 -> String #

showList :: [MD4] -> ShowS #

Show MD5 
Instance details

Defined in Crypto.Hash.MD5

Methods

showsPrec :: Int -> MD5 -> ShowS #

show :: MD5 -> String #

showList :: [MD5] -> ShowS #

Show RIPEMD160 
Instance details

Defined in Crypto.Hash.RIPEMD160

Show SHA1 
Instance details

Defined in Crypto.Hash.SHA1

Methods

showsPrec :: Int -> SHA1 -> ShowS #

show :: SHA1 -> String #

showList :: [SHA1] -> ShowS #

Show SHA224 
Instance details

Defined in Crypto.Hash.SHA224

Show SHA256 
Instance details

Defined in Crypto.Hash.SHA256

Show SHA3_224 
Instance details

Defined in Crypto.Hash.SHA3

Show SHA3_256 
Instance details

Defined in Crypto.Hash.SHA3

Show SHA3_384 
Instance details

Defined in Crypto.Hash.SHA3

Show SHA3_512 
Instance details

Defined in Crypto.Hash.SHA3

Show SHA384 
Instance details

Defined in Crypto.Hash.SHA384

Show SHA512 
Instance details

Defined in Crypto.Hash.SHA512

Show SHA512t_224 
Instance details

Defined in Crypto.Hash.SHA512t

Show SHA512t_256 
Instance details

Defined in Crypto.Hash.SHA512t

Show Skein256_224 
Instance details

Defined in Crypto.Hash.Skein256

Show Skein256_256 
Instance details

Defined in Crypto.Hash.Skein256

Show Skein512_224 
Instance details

Defined in Crypto.Hash.Skein512

Show Skein512_256 
Instance details

Defined in Crypto.Hash.Skein512

Show Skein512_384 
Instance details

Defined in Crypto.Hash.Skein512

Show Skein512_512 
Instance details

Defined in Crypto.Hash.Skein512

Show Tiger 
Instance details

Defined in Crypto.Hash.Tiger

Methods

showsPrec :: Int -> Tiger -> ShowS #

show :: Tiger -> String #

showList :: [Tiger] -> ShowS #

Show Whirlpool 
Instance details

Defined in Crypto.Hash.Whirlpool

Show EmailAddress 
Instance details

Defined in Text.Email.Parser

Show Error 
Instance details

Defined in Env.Internal.Error

Methods

showsPrec :: Int -> Error -> ShowS #

show :: Error -> String #

showList :: [Error] -> ShowS #

Show EsqueletoError 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Show FromClause 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Show Ident 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Methods

showsPrec :: Int -> Ident -> ShowS #

show :: Ident -> String #

showList :: [Ident] -> ShowS #

Show JoinKind 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Show OnClauseWithoutMatchingJoinException 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Show RenderExprException 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Show SqlBinOpCompositeError 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Show SubQueryType 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Show UnexpectedCaseError 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Show UnexpectedValueError 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Show AggMode 
Instance details

Defined in Database.Esqueleto.PostgreSQL

Show LogStr 
Instance details

Defined in System.Log.FastLogger.LogStr

Show SecretVision 
Instance details

Defined in Text.PrettyPrint.GenericPretty.Type

Show ForeignSrcLang 
Instance details

Defined in GHC.ForeignSrcLang.Type

Show Extension 
Instance details

Defined in GHC.LanguageExtensions.Type

Show KindRep 
Instance details

Defined in GHC.Show

Show Module

Since: base-4.9.0.0

Instance details

Defined in GHC.Show

Show Ordering

Since: base-2.1

Instance details

Defined in GHC.Show

Show TrName

Since: base-4.9.0.0

Instance details

Defined in GHC.Show

Show TyCon

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> TyCon -> ShowS #

show :: TyCon -> String #

showList :: [TyCon] -> ShowS #

Show TypeLitSort

Since: base-4.11.0.0

Instance details

Defined in GHC.Show

Show EncapsulatedPopperException 
Instance details

Defined in Network.HTTP.Client.Request

Methods

showsPrec :: Int -> EncapsulatedPopperException -> ShowS #

show :: EncapsulatedPopperException -> String #

showList :: [EncapsulatedPopperException] -> ShowS #

Show ConnHost 
Instance details

Defined in Network.HTTP.Client.Types

Show ConnKey 
Instance details

Defined in Network.HTTP.Client.Types

Show Cookie 
Instance details

Defined in Network.HTTP.Client.Types

Show CookieJar 
Instance details

Defined in Network.HTTP.Client.Types

Show HttpException 
Instance details

Defined in Network.HTTP.Client.Types

Show HttpExceptionContent 
Instance details

Defined in Network.HTTP.Client.Types

Show HttpExceptionContentWrapper 
Instance details

Defined in Network.HTTP.Client.Types

Methods

showsPrec :: Int -> HttpExceptionContentWrapper -> ShowS #

show :: HttpExceptionContentWrapper -> String #

showList :: [HttpExceptionContentWrapper] -> ShowS #

Show Proxy 
Instance details

Defined in Network.HTTP.Client.Types

Methods

showsPrec :: Int -> Proxy -> ShowS #

show :: Proxy -> String #

showList :: [Proxy] -> ShowS #

Show ProxySecureMode 
Instance details

Defined in Network.HTTP.Client.Types

Show Request 
Instance details

Defined in Network.HTTP.Client.Types

Show ResponseClose 
Instance details

Defined in Network.HTTP.Client.Types

Show ResponseTimeout 
Instance details

Defined in Network.HTTP.Client.Types

Show StatusHeaders 
Instance details

Defined in Network.HTTP.Client.Types

Show StreamFileStatus 
Instance details

Defined in Network.HTTP.Client.Types

Show DigestAuthException 
Instance details

Defined in Network.HTTP.Client.TLS

Show DigestAuthExceptionDetails 
Instance details

Defined in Network.HTTP.Client.TLS

Show ByteRange 
Instance details

Defined in Network.HTTP.Types.Header

Show StdMethod 
Instance details

Defined in Network.HTTP.Types.Method

Show Status 
Instance details

Defined in Network.HTTP.Types.Status

Show EscapeItem 
Instance details

Defined in Network.HTTP.Types.URI

Show HttpVersion 
Instance details

Defined in Network.HTTP.Types.Version

Show CompressionAlgo 
Instance details

Defined in Network.HPACK.Types

Show DecodeError 
Instance details

Defined in Network.HPACK.Types

Show EncodeStrategy 
Instance details

Defined in Network.HPACK.Types

Show HIndex 
Instance details

Defined in Network.HPACK.Types

Methods

showsPrec :: Int -> HIndex -> ShowS #

show :: HIndex -> String #

showList :: [HIndex] -> ShowS #

Show ClosedCode 
Instance details

Defined in Network.HTTP2.Arch.Types

Methods

showsPrec :: Int -> ClosedCode -> ShowS #

show :: ClosedCode -> String #

showList :: [ClosedCode] -> ShowS #

Show FileSpec 
Instance details

Defined in Network.HTTP2.Arch.Types

Show InpObj 
Instance details

Defined in Network.HTTP2.Arch.Types

Show OutObj 
Instance details

Defined in Network.HTTP2.Arch.Types

Show Stream 
Instance details

Defined in Network.HTTP2.Arch.Types

Methods

showsPrec :: Int -> Stream -> ShowS #

show :: Stream -> String #

showList :: [Stream] -> ShowS #

Show StreamState 
Instance details

Defined in Network.HTTP2.Arch.Types

Methods

showsPrec :: Int -> StreamState -> ShowS #

show :: StreamState -> String #

showList :: [StreamState] -> ShowS #

Show ErrorCodeId 
Instance details

Defined in Network.HTTP2.Frame.Types

Show Frame 
Instance details

Defined in Network.HTTP2.Frame.Types

Methods

showsPrec :: Int -> Frame -> ShowS #

show :: Frame -> String #

showList :: [Frame] -> ShowS #

Show FrameHeader 
Instance details

Defined in Network.HTTP2.Frame.Types

Show FramePayload 
Instance details

Defined in Network.HTTP2.Frame.Types

Show FrameTypeId 
Instance details

Defined in Network.HTTP2.Frame.Types

Show HTTP2Error 
Instance details

Defined in Network.HTTP2.Frame.Types

Show Priority 
Instance details

Defined in Network.HTTP2.Frame.Types

Show Settings 
Instance details

Defined in Network.HTTP2.Frame.Types

Show SettingsKeyId 
Instance details

Defined in Network.HTTP2.Frame.Types

Show Request 
Instance details

Defined in Network.HTTP2.Server.Types

Show Response 
Instance details

Defined in Network.HTTP2.Server.Types

Show TooMuchConcurrency 
Instance details

Defined in Network.HTTP2.Client2

Methods

showsPrec :: Int -> TooMuchConcurrency -> ShowS #

show :: TooMuchConcurrency -> String #

showList :: [TooMuchConcurrency] -> ShowS #

Show RemoteSentGoAwayFrame 
Instance details

Defined in Network.HTTP2.Client2.Dispatch

Methods

showsPrec :: Int -> RemoteSentGoAwayFrame -> ShowS #

show :: RemoteSentGoAwayFrame -> String #

showList :: [RemoteSentGoAwayFrame] -> ShowS #

Show StreamEvent 
Instance details

Defined in Network.HTTP2.Client2.Dispatch

Methods

showsPrec :: Int -> StreamEvent -> ShowS #

show :: StreamEvent -> String #

showList :: [StreamEvent] -> ShowS #

Show ClientError 
Instance details

Defined in Network.HTTP2.Client2.Exceptions

Methods

showsPrec :: Int -> ClientError -> ShowS #

show :: ClientError -> String #

showList :: [ClientError] -> 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 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 IP 
Instance details

Defined in Data.IP.Addr

Methods

showsPrec :: Int -> IP -> ShowS #

show :: IP -> String #

showList :: [IP] -> ShowS #

Show IPv4 
Instance details

Defined in Data.IP.Addr

Methods

showsPrec :: Int -> IPv4 -> ShowS #

show :: IPv4 -> String #

showList :: [IPv4] -> ShowS #

Show IPv6 
Instance details

Defined in Data.IP.Addr

Methods

showsPrec :: Int -> IPv6 -> ShowS #

show :: IPv6 -> String #

showList :: [IPv6] -> ShowS #

Show IPRange 
Instance details

Defined in Data.IP.Range

Show Environment 
Instance details

Defined in Katip.Core

Show LocShow 
Instance details

Defined in Katip.Core

Show LogStr 
Instance details

Defined in Katip.Core

Show Namespace 
Instance details

Defined in Katip.Core

Show PayloadSelection 
Instance details

Defined in Katip.Core

Show ScribeSettings 
Instance details

Defined in Katip.Core

Show Severity 
Instance details

Defined in Katip.Core

Show ThreadIdText 
Instance details

Defined in Katip.Core

Show Verbosity 
Instance details

Defined in Katip.Core

Show ColorStrategy 
Instance details

Defined in Katip.Scribes.Handle

Show AddHodlInvoiceRequest 
Instance details

Defined in LndClient.Data.AddHodlInvoice

Methods

showsPrec :: Int -> AddHodlInvoiceRequest -> ShowS #

show :: AddHodlInvoiceRequest -> String #

showList :: [AddHodlInvoiceRequest] -> ShowS #

Show AddInvoiceRequest 
Instance details

Defined in LndClient.Data.AddInvoice

Methods

showsPrec :: Int -> AddInvoiceRequest -> ShowS #

show :: AddInvoiceRequest -> String #

showList :: [AddInvoiceRequest] -> ShowS #

Show AddInvoiceResponse 
Instance details

Defined in LndClient.Data.AddInvoice

Methods

showsPrec :: Int -> AddInvoiceResponse -> ShowS #

show :: AddInvoiceResponse -> String #

showList :: [AddInvoiceResponse] -> ShowS #

Show Channel 
Instance details

Defined in LndClient.Data.Channel

Methods

showsPrec :: Int -> Channel -> ShowS #

show :: Channel -> String #

showList :: [Channel] -> ShowS #

Show ChannelBackup 
Instance details

Defined in LndClient.Data.ChannelBackup

Methods

showsPrec :: Int -> ChannelBackup -> ShowS #

show :: ChannelBackup -> String #

showList :: [ChannelBackup] -> ShowS #

Show SingleChanBackupBlob 
Instance details

Defined in LndClient.Data.ChannelBackup

Methods

showsPrec :: Int -> SingleChanBackupBlob -> ShowS #

show :: SingleChanBackupBlob -> String #

showList :: [SingleChanBackupBlob] -> ShowS #

Show ChannelPoint 
Instance details

Defined in LndClient.Data.ChannelPoint

Methods

showsPrec :: Int -> ChannelPoint -> ShowS #

show :: ChannelPoint -> String #

showList :: [ChannelPoint] -> ShowS #

Show ChannelCloseSummary 
Instance details

Defined in LndClient.Data.CloseChannel

Methods

showsPrec :: Int -> ChannelCloseSummary -> ShowS #

show :: ChannelCloseSummary -> String #

showList :: [ChannelCloseSummary] -> ShowS #

Show ChannelCloseUpdate 
Instance details

Defined in LndClient.Data.CloseChannel

Methods

showsPrec :: Int -> ChannelCloseUpdate -> ShowS #

show :: ChannelCloseUpdate -> String #

showList :: [ChannelCloseUpdate] -> ShowS #

Show CloseChannelRequest 
Instance details

Defined in LndClient.Data.CloseChannel

Methods

showsPrec :: Int -> CloseChannelRequest -> ShowS #

show :: CloseChannelRequest -> String #

showList :: [CloseChannelRequest] -> ShowS #

Show CloseStatusUpdate 
Instance details

Defined in LndClient.Data.CloseChannel

Methods

showsPrec :: Int -> CloseStatusUpdate -> ShowS #

show :: CloseStatusUpdate -> String #

showList :: [CloseStatusUpdate] -> ShowS #

Show ClosedChannel 
Instance details

Defined in LndClient.Data.ClosedChannel

Methods

showsPrec :: Int -> ClosedChannel -> ShowS #

show :: ClosedChannel -> String #

showList :: [ClosedChannel] -> ShowS #

Show ClosedChannelsRequest 
Instance details

Defined in LndClient.Data.ClosedChannels

Methods

showsPrec :: Int -> ClosedChannelsRequest -> ShowS #

show :: ClosedChannelsRequest -> String #

showList :: [ClosedChannelsRequest] -> ShowS #

Show FinalizePsbtRequest 
Instance details

Defined in LndClient.Data.FinalizePsbt

Methods

showsPrec :: Int -> FinalizePsbtRequest -> ShowS #

show :: FinalizePsbtRequest -> String #

showList :: [FinalizePsbtRequest] -> ShowS #

Show FinalizePsbtResponse 
Instance details

Defined in LndClient.Data.FinalizePsbt

Methods

showsPrec :: Int -> FinalizePsbtResponse -> ShowS #

show :: FinalizePsbtResponse -> String #

showList :: [FinalizePsbtResponse] -> ShowS #

Show ForceClosedChannel 
Instance details

Defined in LndClient.Data.ForceClosedChannel

Methods

showsPrec :: Int -> ForceClosedChannel -> ShowS #

show :: ForceClosedChannel -> String #

showList :: [ForceClosedChannel] -> ShowS #

Show Fee 
Instance details

Defined in LndClient.Data.FundPsbt

Methods

showsPrec :: Int -> Fee -> ShowS #

show :: Fee -> String #

showList :: [Fee] -> ShowS #

Show FundPsbtRequest 
Instance details

Defined in LndClient.Data.FundPsbt

Methods

showsPrec :: Int -> FundPsbtRequest -> ShowS #

show :: FundPsbtRequest -> String #

showList :: [FundPsbtRequest] -> ShowS #

Show FundPsbtResponse 
Instance details

Defined in LndClient.Data.FundPsbt

Methods

showsPrec :: Int -> FundPsbtResponse -> ShowS #

show :: FundPsbtResponse -> String #

showList :: [FundPsbtResponse] -> ShowS #

Show TxTemplate 
Instance details

Defined in LndClient.Data.FundPsbt

Methods

showsPrec :: Int -> TxTemplate -> ShowS #

show :: TxTemplate -> String #

showList :: [TxTemplate] -> ShowS #

Show UtxoLease 
Instance details

Defined in LndClient.Data.FundPsbt

Methods

showsPrec :: Int -> UtxoLease -> ShowS #

show :: UtxoLease -> String #

showList :: [UtxoLease] -> ShowS #

Show FundingPsbtFinalize 
Instance details

Defined in LndClient.Data.FundingPsbtFinalize

Methods

showsPrec :: Int -> FundingPsbtFinalize -> ShowS #

show :: FundingPsbtFinalize -> String #

showList :: [FundingPsbtFinalize] -> ShowS #

Show FundingPsbtVerify 
Instance details

Defined in LndClient.Data.FundingPsbtVerify

Methods

showsPrec :: Int -> FundingPsbtVerify -> ShowS #

show :: FundingPsbtVerify -> String #

showList :: [FundingPsbtVerify] -> ShowS #

Show ChanPointShim 
Instance details

Defined in LndClient.Data.FundingShim

Methods

showsPrec :: Int -> ChanPointShim -> ShowS #

show :: ChanPointShim -> String #

showList :: [ChanPointShim] -> ShowS #

Show FundingShim 
Instance details

Defined in LndClient.Data.FundingShim

Methods

showsPrec :: Int -> FundingShim -> ShowS #

show :: FundingShim -> String #

showList :: [FundingShim] -> ShowS #

Show KeyDescriptor 
Instance details

Defined in LndClient.Data.FundingShim

Methods

showsPrec :: Int -> KeyDescriptor -> ShowS #

show :: KeyDescriptor -> String #

showList :: [KeyDescriptor] -> ShowS #

Show FundingShimCancel 
Instance details

Defined in LndClient.Data.FundingShimCancel

Methods

showsPrec :: Int -> FundingShimCancel -> ShowS #

show :: FundingShimCancel -> String #

showList :: [FundingShimCancel] -> ShowS #

Show FundingStateStepRequest 
Instance details

Defined in LndClient.Data.FundingStateStep

Methods

showsPrec :: Int -> FundingStateStepRequest -> ShowS #

show :: FundingStateStepRequest -> String #

showList :: [FundingStateStepRequest] -> ShowS #

Show GetInfoResponse 
Instance details

Defined in LndClient.Data.GetInfo

Methods

showsPrec :: Int -> GetInfoResponse -> ShowS #

show :: GetInfoResponse -> String #

showList :: [GetInfoResponse] -> ShowS #

Show Invoice 
Instance details

Defined in LndClient.Data.Invoice

Methods

showsPrec :: Int -> Invoice -> ShowS #

show :: Invoice -> String #

showList :: [Invoice] -> ShowS #

Show InvoiceState 
Instance details

Defined in LndClient.Data.Invoice

Methods

showsPrec :: Int -> InvoiceState -> ShowS #

show :: InvoiceState -> String #

showList :: [InvoiceState] -> ShowS #

Show TxKind 
Instance details

Defined in LndClient.Data.Kind

Show LeaseOutputRequest 
Instance details

Defined in LndClient.Data.LeaseOutput

Methods

showsPrec :: Int -> LeaseOutputRequest -> ShowS #

show :: LeaseOutputRequest -> String #

showList :: [LeaseOutputRequest] -> ShowS #

Show LeaseOutputResponse 
Instance details

Defined in LndClient.Data.LeaseOutput

Methods

showsPrec :: Int -> LeaseOutputResponse -> ShowS #

show :: LeaseOutputResponse -> String #

showList :: [LeaseOutputResponse] -> ShowS #

Show ListChannelsRequest 
Instance details

Defined in LndClient.Data.ListChannels

Methods

showsPrec :: Int -> ListChannelsRequest -> ShowS #

show :: ListChannelsRequest -> String #

showList :: [ListChannelsRequest] -> ShowS #

Show ListInvoiceRequest 
Instance details

Defined in LndClient.Data.ListInvoices

Methods

showsPrec :: Int -> ListInvoiceRequest -> ShowS #

show :: ListInvoiceRequest -> String #

showList :: [ListInvoiceRequest] -> ShowS #

Show ListInvoiceResponse 
Instance details

Defined in LndClient.Data.ListInvoices

Methods

showsPrec :: Int -> ListInvoiceResponse -> ShowS #

show :: ListInvoiceResponse -> String #

showList :: [ListInvoiceResponse] -> ShowS #

Show ListLeasesRequest 
Instance details

Defined in LndClient.Data.ListLeases

Methods

showsPrec :: Int -> ListLeasesRequest -> ShowS #

show :: ListLeasesRequest -> String #

showList :: [ListLeasesRequest] -> ShowS #

Show ListLeasesResponse 
Instance details

Defined in LndClient.Data.ListLeases

Methods

showsPrec :: Int -> ListLeasesResponse -> ShowS #

show :: ListLeasesResponse -> String #

showList :: [ListLeasesResponse] -> ShowS #

Show UtxoLease 
Instance details

Defined in LndClient.Data.ListLeases

Methods

showsPrec :: Int -> UtxoLease -> ShowS #

show :: UtxoLease -> String #

showList :: [UtxoLease] -> ShowS #

Show ListUnspentRequest 
Instance details

Defined in LndClient.Data.ListUnspent

Methods

showsPrec :: Int -> ListUnspentRequest -> ShowS #

show :: ListUnspentRequest -> String #

showList :: [ListUnspentRequest] -> ShowS #

Show ListUnspentResponse 
Instance details

Defined in LndClient.Data.ListUnspent

Methods

showsPrec :: Int -> ListUnspentResponse -> ShowS #

show :: ListUnspentResponse -> String #

showList :: [ListUnspentResponse] -> ShowS #

Show Utxo 
Instance details

Defined in LndClient.Data.ListUnspent

Methods

showsPrec :: Int -> Utxo -> ShowS #

show :: Utxo -> String #

showList :: [Utxo] -> ShowS #

Show LndConfig 
Instance details

Defined in LndClient.Data.LndEnv

Methods

showsPrec :: Int -> LndConfig -> ShowS #

show :: LndConfig -> String #

showList :: [LndConfig] -> ShowS #

Show LndTlsCert 
Instance details

Defined in LndClient.Data.LndEnv

Methods

showsPrec :: Int -> LndTlsCert -> ShowS #

show :: LndTlsCert -> String #

showList :: [LndTlsCert] -> ShowS #

Show AddressType 
Instance details

Defined in LndClient.Data.NewAddress

Methods

showsPrec :: Int -> AddressType -> ShowS #

show :: AddressType -> String #

showList :: [AddressType] -> ShowS #

Show NewAddressRequest 
Instance details

Defined in LndClient.Data.NewAddress

Methods

showsPrec :: Int -> NewAddressRequest -> ShowS #

show :: NewAddressRequest -> String #

showList :: [NewAddressRequest] -> ShowS #

Show NewAddressResponse 
Instance details

Defined in LndClient.Data.NewAddress

Methods

showsPrec :: Int -> NewAddressResponse -> ShowS #

show :: NewAddressResponse -> String #

showList :: [NewAddressResponse] -> ShowS #

Show AddIndex 
Instance details

Defined in LndClient.Data.Newtype

Methods

showsPrec :: Int -> AddIndex -> ShowS #

show :: AddIndex -> String #

showList :: [AddIndex] -> ShowS #

Show ChanId 
Instance details

Defined in LndClient.Data.Newtype

Show GrpcTimeoutSeconds 
Instance details

Defined in LndClient.Data.Newtype

Methods

showsPrec :: Int -> GrpcTimeoutSeconds -> ShowS #

show :: GrpcTimeoutSeconds -> String #

showList :: [GrpcTimeoutSeconds] -> ShowS #

Show MSat 
Instance details

Defined in LndClient.Data.Newtype

Methods

showsPrec :: Int -> MSat -> ShowS #

show :: MSat -> String #

showList :: [MSat] -> ShowS #

Show NodeLocation 
Instance details

Defined in LndClient.Data.Newtype

Methods

showsPrec :: Int -> NodeLocation -> ShowS #

show :: NodeLocation -> String #

showList :: [NodeLocation] -> ShowS #

Show NodePubKey 
Instance details

Defined in LndClient.Data.Newtype

Show PaymentRequest 
Instance details

Defined in LndClient.Data.Newtype

Methods

showsPrec :: Int -> PaymentRequest -> ShowS #

show :: PaymentRequest -> String #

showList :: [PaymentRequest] -> ShowS #

Show PendingChannelId 
Instance details

Defined in LndClient.Data.Newtype

Methods

showsPrec :: Int -> PendingChannelId -> ShowS #

show :: PendingChannelId -> String #

showList :: [PendingChannelId] -> ShowS #

Show Psbt 
Instance details

Defined in LndClient.Data.Newtype

Methods

showsPrec :: Int -> Psbt -> ShowS #

show :: Psbt -> String #

showList :: [Psbt] -> ShowS #

Show RHash 
Instance details

Defined in LndClient.Data.Newtype

Methods

showsPrec :: Int -> RHash -> ShowS #

show :: RHash -> String #

showList :: [RHash] -> ShowS #

Show RPreimage 
Instance details

Defined in LndClient.Data.Newtype

Show RawTx 
Instance details

Defined in LndClient.Data.Newtype

Methods

showsPrec :: Int -> RawTx -> ShowS #

show :: RawTx -> String #

showList :: [RawTx] -> ShowS #

Show Seconds 
Instance details

Defined in LndClient.Data.Newtype

Methods

showsPrec :: Int -> Seconds -> ShowS #

show :: Seconds -> String #

showList :: [Seconds] -> ShowS #

Show SettleIndex 
Instance details

Defined in LndClient.Data.Newtype

Methods

showsPrec :: Int -> SettleIndex -> ShowS #

show :: SettleIndex -> String #

showList :: [SettleIndex] -> ShowS #

Show ChannelOpenUpdate 
Instance details

Defined in LndClient.Data.OpenChannel

Methods

showsPrec :: Int -> ChannelOpenUpdate -> ShowS #

show :: ChannelOpenUpdate -> String #

showList :: [ChannelOpenUpdate] -> ShowS #

Show OpenChannelRequest 
Instance details

Defined in LndClient.Data.OpenChannel

Methods

showsPrec :: Int -> OpenChannelRequest -> ShowS #

show :: OpenChannelRequest -> String #

showList :: [OpenChannelRequest] -> ShowS #

Show OpenStatusUpdate 
Instance details

Defined in LndClient.Data.OpenChannel

Methods

showsPrec :: Int -> OpenStatusUpdate -> ShowS #

show :: OpenStatusUpdate -> String #

showList :: [OpenStatusUpdate] -> ShowS #

Show OpenStatusUpdate' 
Instance details

Defined in LndClient.Data.OpenChannel

Methods

showsPrec :: Int -> OpenStatusUpdate' -> ShowS #

show :: OpenStatusUpdate' -> String #

showList :: [OpenStatusUpdate'] -> ShowS #

Show ReadyForPsbtFunding 
Instance details

Defined in LndClient.Data.OpenChannel

Methods

showsPrec :: Int -> ReadyForPsbtFunding -> ShowS #

show :: ReadyForPsbtFunding -> String #

showList :: [ReadyForPsbtFunding] -> ShowS #

Show OutPoint 
Instance details

Defined in LndClient.Data.OutPoint

Methods

showsPrec :: Int -> OutPoint -> ShowS #

show :: OutPoint -> String #

showList :: [OutPoint] -> ShowS #

Show PayReq 
Instance details

Defined in LndClient.Data.PayReq

Methods

showsPrec :: Int -> PayReq -> ShowS #

show :: PayReq -> String #

showList :: [PayReq] -> ShowS #

Show Payment 
Instance details

Defined in LndClient.Data.Payment

Methods

showsPrec :: Int -> Payment -> ShowS #

show :: Payment -> String #

showList :: [Payment] -> ShowS #

Show PaymentStatus 
Instance details

Defined in LndClient.Data.Payment

Methods

showsPrec :: Int -> PaymentStatus -> ShowS #

show :: PaymentStatus -> String #

showList :: [PaymentStatus] -> ShowS #

Show ConnectPeerRequest 
Instance details

Defined in LndClient.Data.Peer

Methods

showsPrec :: Int -> ConnectPeerRequest -> ShowS #

show :: ConnectPeerRequest -> String #

showList :: [ConnectPeerRequest] -> ShowS #

Show LightningAddress 
Instance details

Defined in LndClient.Data.Peer

Methods

showsPrec :: Int -> LightningAddress -> ShowS #

show :: LightningAddress -> String #

showList :: [LightningAddress] -> ShowS #

Show Peer 
Instance details

Defined in LndClient.Data.Peer

Methods

showsPrec :: Int -> Peer -> ShowS #

show :: Peer -> String #

showList :: [Peer] -> ShowS #

Show PendingChannel 
Instance details

Defined in LndClient.Data.PendingChannel

Methods

showsPrec :: Int -> PendingChannel -> ShowS #

show :: PendingChannel -> String #

showList :: [PendingChannel] -> ShowS #

Show PendingChannelsResponse 
Instance details

Defined in LndClient.Data.PendingChannels

Methods

showsPrec :: Int -> PendingChannelsResponse -> ShowS #

show :: PendingChannelsResponse -> String #

showList :: [PendingChannelsResponse] -> ShowS #

Show PendingOpenChannel 
Instance details

Defined in LndClient.Data.PendingOpenChannel

Methods

showsPrec :: Int -> PendingOpenChannel -> ShowS #

show :: PendingOpenChannel -> String #

showList :: [PendingOpenChannel] -> ShowS #

Show PsbtShim 
Instance details

Defined in LndClient.Data.PsbtShim

Methods

showsPrec :: Int -> PsbtShim -> ShowS #

show :: PsbtShim -> String #

showList :: [PsbtShim] -> ShowS #

Show PublishTransactionRequest 
Instance details

Defined in LndClient.Data.PublishTransaction

Methods

showsPrec :: Int -> PublishTransactionRequest -> ShowS #

show :: PublishTransactionRequest -> String #

showList :: [PublishTransactionRequest] -> ShowS #

Show PublishTransactionResponse 
Instance details

Defined in LndClient.Data.PublishTransaction

Methods

showsPrec :: Int -> PublishTransactionResponse -> ShowS #

show :: PublishTransactionResponse -> String #

showList :: [PublishTransactionResponse] -> ShowS #

Show ReleaseOutputRequest 
Instance details

Defined in LndClient.Data.ReleaseOutput

Methods

showsPrec :: Int -> ReleaseOutputRequest -> ShowS #

show :: ReleaseOutputRequest -> String #

showList :: [ReleaseOutputRequest] -> ShowS #

Show ReleaseOutputResponse 
Instance details

Defined in LndClient.Data.ReleaseOutput

Methods

showsPrec :: Int -> ReleaseOutputResponse -> ShowS #

show :: ReleaseOutputResponse -> String #

showList :: [ReleaseOutputResponse] -> ShowS #

Show SendCoinsRequest 
Instance details

Defined in LndClient.Data.SendCoins

Methods

showsPrec :: Int -> SendCoinsRequest -> ShowS #

show :: SendCoinsRequest -> String #

showList :: [SendCoinsRequest] -> ShowS #

Show SendCoinsResponse 
Instance details

Defined in LndClient.Data.SendCoins

Methods

showsPrec :: Int -> SendCoinsResponse -> ShowS #

show :: SendCoinsResponse -> String #

showList :: [SendCoinsResponse] -> ShowS #

Show SendPaymentRequest 
Instance details

Defined in LndClient.Data.SendPayment

Methods

showsPrec :: Int -> SendPaymentRequest -> ShowS #

show :: SendPaymentRequest -> String #

showList :: [SendPaymentRequest] -> ShowS #

Show SendPaymentResponse 
Instance details

Defined in LndClient.Data.SendPayment

Methods

showsPrec :: Int -> SendPaymentResponse -> ShowS #

show :: SendPaymentResponse -> String #

showList :: [SendPaymentResponse] -> ShowS #

Show KeyLocator 
Instance details

Defined in LndClient.Data.SignMessage

Methods

showsPrec :: Int -> KeyLocator -> ShowS #

show :: KeyLocator -> String #

showList :: [KeyLocator] -> ShowS #

Show SignMessageRequest 
Instance details

Defined in LndClient.Data.SignMessage

Methods

showsPrec :: Int -> SignMessageRequest -> ShowS #

show :: SignMessageRequest -> String #

showList :: [SignMessageRequest] -> ShowS #

Show SignMessageResponse 
Instance details

Defined in LndClient.Data.SignMessage

Methods

showsPrec :: Int -> SignMessageResponse -> ShowS #

show :: SignMessageResponse -> String #

showList :: [SignMessageResponse] -> ShowS #

Show ChannelEventUpdate 
Instance details

Defined in LndClient.Data.SubscribeChannelEvents

Methods

showsPrec :: Int -> ChannelEventUpdate -> ShowS #

show :: ChannelEventUpdate -> String #

showList :: [ChannelEventUpdate] -> ShowS #

Show UpdateChannel 
Instance details

Defined in LndClient.Data.SubscribeChannelEvents

Methods

showsPrec :: Int -> UpdateChannel -> ShowS #

show :: UpdateChannel -> String #

showList :: [UpdateChannel] -> ShowS #

Show UpdateType 
Instance details

Defined in LndClient.Data.SubscribeChannelEvents

Methods

showsPrec :: Int -> UpdateType -> ShowS #

show :: UpdateType -> String #

showList :: [UpdateType] -> ShowS #

Show SubscribeInvoicesRequest 
Instance details

Defined in LndClient.Data.SubscribeInvoices

Methods

showsPrec :: Int -> SubscribeInvoicesRequest -> ShowS #

show :: SubscribeInvoicesRequest -> String #

showList :: [SubscribeInvoicesRequest] -> ShowS #

Show TrackPaymentRequest 
Instance details

Defined in LndClient.Data.TrackPayment

Methods

showsPrec :: Int -> TrackPaymentRequest -> ShowS #

show :: TrackPaymentRequest -> String #

showList :: [TrackPaymentRequest] -> ShowS #

Show LnInitiator 
Instance details

Defined in LndClient.Data.Type

Methods

showsPrec :: Int -> LnInitiator -> ShowS #

show :: LnInitiator -> String #

showList :: [LnInitiator] -> ShowS #

Show LndError 
Instance details

Defined in LndClient.Data.Type

Show LoggingMeta 
Instance details

Defined in LndClient.Data.Type

Methods

showsPrec :: Int -> LoggingMeta -> ShowS #

show :: LoggingMeta -> String #

showList :: [LoggingMeta] -> ShowS #

Show VerifyMessageRequest 
Instance details

Defined in LndClient.Data.VerifyMessage

Methods

showsPrec :: Int -> VerifyMessageRequest -> ShowS #

show :: VerifyMessageRequest -> String #

showList :: [VerifyMessageRequest] -> ShowS #

Show VerifyMessageResponse 
Instance details

Defined in LndClient.Data.VerifyMessage

Methods

showsPrec :: Int -> VerifyMessageResponse -> ShowS #

show :: VerifyMessageResponse -> String #

showList :: [VerifyMessageResponse] -> ShowS #

Show WaitingCloseChannel 
Instance details

Defined in LndClient.Data.WaitingCloseChannel

Methods

showsPrec :: Int -> WaitingCloseChannel -> ShowS #

show :: WaitingCloseChannel -> String #

showList :: [WaitingCloseChannel] -> ShowS #

Show WalletBalance 
Instance details

Defined in LndClient.Data.WalletBalance

Methods

showsPrec :: Int -> WalletBalance -> ShowS #

show :: WalletBalance -> String #

showList :: [WalletBalance] -> ShowS #

Show AddHoldInvoiceRequest 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

showsPrec :: Int -> AddHoldInvoiceRequest -> ShowS #

show :: AddHoldInvoiceRequest -> String #

showList :: [AddHoldInvoiceRequest] -> ShowS #

Show AddHoldInvoiceResp 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

showsPrec :: Int -> AddHoldInvoiceResp -> ShowS #

show :: AddHoldInvoiceResp -> String #

showList :: [AddHoldInvoiceResp] -> ShowS #

Show CancelInvoiceMsg 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

showsPrec :: Int -> CancelInvoiceMsg -> ShowS #

show :: CancelInvoiceMsg -> String #

showList :: [CancelInvoiceMsg] -> ShowS #

Show CancelInvoiceResp 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

showsPrec :: Int -> CancelInvoiceResp -> ShowS #

show :: CancelInvoiceResp -> String #

showList :: [CancelInvoiceResp] -> ShowS #

Show LookupInvoiceMsg 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

showsPrec :: Int -> LookupInvoiceMsg -> ShowS #

show :: LookupInvoiceMsg -> String #

showList :: [LookupInvoiceMsg] -> ShowS #

Show LookupInvoiceMsg'InvoiceRef 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

showsPrec :: Int -> LookupInvoiceMsg'InvoiceRef -> ShowS #

show :: LookupInvoiceMsg'InvoiceRef -> String #

showList :: [LookupInvoiceMsg'InvoiceRef] -> ShowS #

Show LookupModifier 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

showsPrec :: Int -> LookupModifier -> ShowS #

show :: LookupModifier -> String #

showList :: [LookupModifier] -> ShowS #

Show LookupModifier'UnrecognizedValue 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

showsPrec :: Int -> LookupModifier'UnrecognizedValue -> ShowS #

show :: LookupModifier'UnrecognizedValue -> String #

showList :: [LookupModifier'UnrecognizedValue] -> ShowS #

Show SettleInvoiceMsg 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

showsPrec :: Int -> SettleInvoiceMsg -> ShowS #

show :: SettleInvoiceMsg -> String #

showList :: [SettleInvoiceMsg] -> ShowS #

Show SettleInvoiceResp 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

showsPrec :: Int -> SettleInvoiceResp -> ShowS #

show :: SettleInvoiceResp -> String #

showList :: [SettleInvoiceResp] -> ShowS #

Show SubscribeSingleInvoiceRequest 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

showsPrec :: Int -> SubscribeSingleInvoiceRequest -> ShowS #

show :: SubscribeSingleInvoiceRequest -> String #

showList :: [SubscribeSingleInvoiceRequest] -> ShowS #

Show AddressType 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> AddressType -> ShowS #

show :: AddressType -> String #

showList :: [AddressType] -> ShowS #

Show AddressType'UnrecognizedValue 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> AddressType'UnrecognizedValue -> ShowS #

show :: AddressType'UnrecognizedValue -> String #

showList :: [AddressType'UnrecognizedValue] -> ShowS #

Show BatchOpenChannel 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> BatchOpenChannel -> ShowS #

show :: BatchOpenChannel -> String #

showList :: [BatchOpenChannel] -> ShowS #

Show BatchOpenChannelRequest 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> BatchOpenChannelRequest -> ShowS #

show :: BatchOpenChannelRequest -> String #

showList :: [BatchOpenChannelRequest] -> ShowS #

Show BatchOpenChannelResponse 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> BatchOpenChannelResponse -> ShowS #

show :: BatchOpenChannelResponse -> String #

showList :: [BatchOpenChannelResponse] -> ShowS #

Show Chain 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> Chain -> ShowS #

show :: Chain -> String #

showList :: [Chain] -> ShowS #

Show ChannelAcceptRequest 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> ChannelAcceptRequest -> ShowS #

show :: ChannelAcceptRequest -> String #

showList :: [ChannelAcceptRequest] -> ShowS #

Show ChannelAcceptResponse 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> ChannelAcceptResponse -> ShowS #

show :: ChannelAcceptResponse -> String #

showList :: [ChannelAcceptResponse] -> ShowS #

Show ChannelCloseUpdate 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> ChannelCloseUpdate -> ShowS #

show :: ChannelCloseUpdate -> String #

showList :: [ChannelCloseUpdate] -> ShowS #

Show ChannelOpenUpdate 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> ChannelOpenUpdate -> ShowS #

show :: ChannelOpenUpdate -> String #

showList :: [ChannelOpenUpdate] -> ShowS #

Show CloseChannelRequest 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> CloseChannelRequest -> ShowS #

show :: CloseChannelRequest -> String #

showList :: [CloseChannelRequest] -> ShowS #

Show CloseStatusUpdate 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> CloseStatusUpdate -> ShowS #

show :: CloseStatusUpdate -> String #

showList :: [CloseStatusUpdate] -> ShowS #

Show CloseStatusUpdate'Update 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> CloseStatusUpdate'Update -> ShowS #

show :: CloseStatusUpdate'Update -> String #

showList :: [CloseStatusUpdate'Update] -> ShowS #

Show ClosedChannelsRequest 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> ClosedChannelsRequest -> ShowS #

show :: ClosedChannelsRequest -> String #

showList :: [ClosedChannelsRequest] -> ShowS #

Show ClosedChannelsResponse 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> ClosedChannelsResponse -> ShowS #

show :: ClosedChannelsResponse -> String #

showList :: [ClosedChannelsResponse] -> ShowS #

Show ConfirmationUpdate 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> ConfirmationUpdate -> ShowS #

show :: ConfirmationUpdate -> String #

showList :: [ConfirmationUpdate] -> ShowS #

Show ConnectPeerRequest 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> ConnectPeerRequest -> ShowS #

show :: ConnectPeerRequest -> String #

showList :: [ConnectPeerRequest] -> ShowS #

Show ConnectPeerResponse 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> ConnectPeerResponse -> ShowS #

show :: ConnectPeerResponse -> String #

showList :: [ConnectPeerResponse] -> ShowS #

Show CustomMessage 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> CustomMessage -> ShowS #

show :: CustomMessage -> String #

showList :: [CustomMessage] -> ShowS #

Show DisconnectPeerRequest 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> DisconnectPeerRequest -> ShowS #

show :: DisconnectPeerRequest -> String #

showList :: [DisconnectPeerRequest] -> ShowS #

Show DisconnectPeerResponse 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> DisconnectPeerResponse -> ShowS #

show :: DisconnectPeerResponse -> String #

showList :: [DisconnectPeerResponse] -> ShowS #

Show EstimateFeeRequest 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> EstimateFeeRequest -> ShowS #

show :: EstimateFeeRequest -> String #

showList :: [EstimateFeeRequest] -> ShowS #

Show EstimateFeeRequest'AddrToAmountEntry 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> EstimateFeeRequest'AddrToAmountEntry -> ShowS #

show :: EstimateFeeRequest'AddrToAmountEntry -> String #

showList :: [EstimateFeeRequest'AddrToAmountEntry] -> ShowS #

Show EstimateFeeResponse 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> EstimateFeeResponse -> ShowS #

show :: EstimateFeeResponse -> String #

showList :: [EstimateFeeResponse] -> ShowS #

Show GetInfoRequest 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> GetInfoRequest -> ShowS #

show :: GetInfoRequest -> String #

showList :: [GetInfoRequest] -> ShowS #

Show GetInfoResponse 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> GetInfoResponse -> ShowS #

show :: GetInfoResponse -> String #

showList :: [GetInfoResponse] -> ShowS #

Show GetInfoResponse'FeaturesEntry 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> GetInfoResponse'FeaturesEntry -> ShowS #

show :: GetInfoResponse'FeaturesEntry -> String #

showList :: [GetInfoResponse'FeaturesEntry] -> ShowS #

Show GetRecoveryInfoRequest 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> GetRecoveryInfoRequest -> ShowS #

show :: GetRecoveryInfoRequest -> String #

showList :: [GetRecoveryInfoRequest] -> ShowS #

Show GetRecoveryInfoResponse 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> GetRecoveryInfoResponse -> ShowS #

show :: GetRecoveryInfoResponse -> String #

showList :: [GetRecoveryInfoResponse] -> ShowS #

Show GetTransactionsRequest 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> GetTransactionsRequest -> ShowS #

show :: GetTransactionsRequest -> String #

showList :: [GetTransactionsRequest] -> ShowS #

Show LightningAddress 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> LightningAddress -> ShowS #

show :: LightningAddress -> String #

showList :: [LightningAddress] -> ShowS #

Show ListChannelsRequest 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> ListChannelsRequest -> ShowS #

show :: ListChannelsRequest -> String #

showList :: [ListChannelsRequest] -> ShowS #

Show ListChannelsResponse 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> ListChannelsResponse -> ShowS #

show :: ListChannelsResponse -> String #

showList :: [ListChannelsResponse] -> ShowS #

Show ListPeersRequest 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> ListPeersRequest -> ShowS #

show :: ListPeersRequest -> String #

showList :: [ListPeersRequest] -> ShowS #

Show ListPeersResponse 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> ListPeersResponse -> ShowS #

show :: ListPeersResponse -> String #

showList :: [ListPeersResponse] -> ShowS #

Show ListUnspentRequest 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> ListUnspentRequest -> ShowS #

show :: ListUnspentRequest -> String #

showList :: [ListUnspentRequest] -> ShowS #

Show ListUnspentResponse 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> ListUnspentResponse -> ShowS #

show :: ListUnspentResponse -> String #

showList :: [ListUnspentResponse] -> ShowS #

Show NewAddressRequest 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> NewAddressRequest -> ShowS #

show :: NewAddressRequest -> String #

showList :: [NewAddressRequest] -> ShowS #

Show NewAddressResponse 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> NewAddressResponse -> ShowS #

show :: NewAddressResponse -> String #

showList :: [NewAddressResponse] -> ShowS #

Show OpenChannelRequest 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> OpenChannelRequest -> ShowS #

show :: OpenChannelRequest -> String #

showList :: [OpenChannelRequest] -> ShowS #

Show OpenStatusUpdate 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> OpenStatusUpdate -> ShowS #

show :: OpenStatusUpdate -> String #

showList :: [OpenStatusUpdate] -> ShowS #

Show OpenStatusUpdate'Update 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> OpenStatusUpdate'Update -> ShowS #

show :: OpenStatusUpdate'Update -> String #

showList :: [OpenStatusUpdate'Update] -> ShowS #

Show Peer 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> Peer -> ShowS #

show :: Peer -> String #

showList :: [Peer] -> ShowS #

Show Peer'FeaturesEntry 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> Peer'FeaturesEntry -> ShowS #

show :: Peer'FeaturesEntry -> String #

showList :: [Peer'FeaturesEntry] -> ShowS #

Show Peer'SyncType 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> Peer'SyncType -> ShowS #

show :: Peer'SyncType -> String #

showList :: [Peer'SyncType] -> ShowS #

Show Peer'SyncType'UnrecognizedValue 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> Peer'SyncType'UnrecognizedValue -> ShowS #

show :: Peer'SyncType'UnrecognizedValue -> String #

showList :: [Peer'SyncType'UnrecognizedValue] -> ShowS #

Show PeerEvent 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> PeerEvent -> ShowS #

show :: PeerEvent -> String #

showList :: [PeerEvent] -> ShowS #

Show PeerEvent'EventType 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> PeerEvent'EventType -> ShowS #

show :: PeerEvent'EventType -> String #

showList :: [PeerEvent'EventType] -> ShowS #

Show PeerEvent'EventType'UnrecognizedValue 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> PeerEvent'EventType'UnrecognizedValue -> ShowS #

show :: PeerEvent'EventType'UnrecognizedValue -> String #

showList :: [PeerEvent'EventType'UnrecognizedValue] -> ShowS #

Show PeerEventSubscription 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> PeerEventSubscription -> ShowS #

show :: PeerEventSubscription -> String #

showList :: [PeerEventSubscription] -> ShowS #

Show ReadyForPsbtFunding 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> ReadyForPsbtFunding -> ShowS #

show :: ReadyForPsbtFunding -> String #

showList :: [ReadyForPsbtFunding] -> ShowS #

Show SendCoinsRequest 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> SendCoinsRequest -> ShowS #

show :: SendCoinsRequest -> String #

showList :: [SendCoinsRequest] -> ShowS #

Show SendCoinsResponse 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> SendCoinsResponse -> ShowS #

show :: SendCoinsResponse -> String #

showList :: [SendCoinsResponse] -> ShowS #

Show SendCustomMessageRequest 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> SendCustomMessageRequest -> ShowS #

show :: SendCustomMessageRequest -> String #

showList :: [SendCustomMessageRequest] -> ShowS #

Show SendCustomMessageResponse 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> SendCustomMessageResponse -> ShowS #

show :: SendCustomMessageResponse -> String #

showList :: [SendCustomMessageResponse] -> ShowS #

Show SendManyRequest 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> SendManyRequest -> ShowS #

show :: SendManyRequest -> String #

showList :: [SendManyRequest] -> ShowS #

Show SendManyRequest'AddrToAmountEntry 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> SendManyRequest'AddrToAmountEntry -> ShowS #

show :: SendManyRequest'AddrToAmountEntry -> String #

showList :: [SendManyRequest'AddrToAmountEntry] -> ShowS #

Show SendManyResponse 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> SendManyResponse -> ShowS #

show :: SendManyResponse -> String #

showList :: [SendManyResponse] -> ShowS #

Show SendRequest 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> SendRequest -> ShowS #

show :: SendRequest -> String #

showList :: [SendRequest] -> ShowS #

Show SendRequest'DestCustomRecordsEntry 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> SendRequest'DestCustomRecordsEntry -> ShowS #

show :: SendRequest'DestCustomRecordsEntry -> String #

showList :: [SendRequest'DestCustomRecordsEntry] -> ShowS #

Show SendResponse 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> SendResponse -> ShowS #

show :: SendResponse -> String #

showList :: [SendResponse] -> ShowS #

Show SendToRouteRequest 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> SendToRouteRequest -> ShowS #

show :: SendToRouteRequest -> String #

showList :: [SendToRouteRequest] -> ShowS #

Show SignMessageRequest 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> SignMessageRequest -> ShowS #

show :: SignMessageRequest -> String #

showList :: [SignMessageRequest] -> ShowS #

Show SignMessageResponse 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> SignMessageResponse -> ShowS #

show :: SignMessageResponse -> String #

showList :: [SignMessageResponse] -> ShowS #

Show SubscribeCustomMessagesRequest 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> SubscribeCustomMessagesRequest -> ShowS #

show :: SubscribeCustomMessagesRequest -> String #

showList :: [SubscribeCustomMessagesRequest] -> ShowS #

Show TimestampedError 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> TimestampedError -> ShowS #

show :: TimestampedError -> String #

showList :: [TimestampedError] -> ShowS #

Show Transaction 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> Transaction -> ShowS #

show :: Transaction -> String #

showList :: [Transaction] -> ShowS #

Show TransactionDetails 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> TransactionDetails -> ShowS #

show :: TransactionDetails -> String #

showList :: [TransactionDetails] -> ShowS #

Show Utxo 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> Utxo -> ShowS #

show :: Utxo -> String #

showList :: [Utxo] -> ShowS #

Show VerifyMessageRequest 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> VerifyMessageRequest -> ShowS #

show :: VerifyMessageRequest -> String #

showList :: [VerifyMessageRequest] -> ShowS #

Show VerifyMessageResponse 
Instance details

Defined in Proto.Lightning

Methods

showsPrec :: Int -> VerifyMessageResponse -> ShowS #

show :: VerifyMessageResponse -> String #

showList :: [VerifyMessageResponse] -> ShowS #

Show AMPRecord 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> AMPRecord -> ShowS #

show :: AMPRecord -> String #

showList :: [AMPRecord] -> ShowS #

Show Amount 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> Amount -> ShowS #

show :: Amount -> String #

showList :: [Amount] -> ShowS #

Show ChanInfoRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> ChanInfoRequest -> ShowS #

show :: ChanInfoRequest -> String #

showList :: [ChanInfoRequest] -> ShowS #

Show ChanPointShim 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> ChanPointShim -> ShowS #

show :: ChanPointShim -> String #

showList :: [ChanPointShim] -> ShowS #

Show Channel 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> Channel -> ShowS #

show :: Channel -> String #

showList :: [Channel] -> ShowS #

Show ChannelBalanceRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> ChannelBalanceRequest -> ShowS #

show :: ChannelBalanceRequest -> String #

showList :: [ChannelBalanceRequest] -> ShowS #

Show ChannelBalanceResponse 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> ChannelBalanceResponse -> ShowS #

show :: ChannelBalanceResponse -> String #

showList :: [ChannelBalanceResponse] -> ShowS #

Show ChannelCloseSummary 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> ChannelCloseSummary -> ShowS #

show :: ChannelCloseSummary -> String #

showList :: [ChannelCloseSummary] -> ShowS #

Show ChannelCloseSummary'ClosureType 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> ChannelCloseSummary'ClosureType -> ShowS #

show :: ChannelCloseSummary'ClosureType -> String #

showList :: [ChannelCloseSummary'ClosureType] -> ShowS #

Show ChannelCloseSummary'ClosureType'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> ChannelCloseSummary'ClosureType'UnrecognizedValue -> ShowS #

show :: ChannelCloseSummary'ClosureType'UnrecognizedValue -> String #

showList :: [ChannelCloseSummary'ClosureType'UnrecognizedValue] -> ShowS #

Show ChannelConstraints 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> ChannelConstraints -> ShowS #

show :: ChannelConstraints -> String #

showList :: [ChannelConstraints] -> ShowS #

Show ChannelEdge 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> ChannelEdge -> ShowS #

show :: ChannelEdge -> String #

showList :: [ChannelEdge] -> ShowS #

Show ChannelEdgeUpdate 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> ChannelEdgeUpdate -> ShowS #

show :: ChannelEdgeUpdate -> String #

showList :: [ChannelEdgeUpdate] -> ShowS #

Show ChannelEventSubscription 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> ChannelEventSubscription -> ShowS #

show :: ChannelEventSubscription -> String #

showList :: [ChannelEventSubscription] -> ShowS #

Show ChannelEventUpdate 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> ChannelEventUpdate -> ShowS #

show :: ChannelEventUpdate -> String #

showList :: [ChannelEventUpdate] -> ShowS #

Show ChannelEventUpdate'Channel 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> ChannelEventUpdate'Channel -> ShowS #

show :: ChannelEventUpdate'Channel -> String #

showList :: [ChannelEventUpdate'Channel] -> ShowS #

Show ChannelEventUpdate'UpdateType 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> ChannelEventUpdate'UpdateType -> ShowS #

show :: ChannelEventUpdate'UpdateType -> String #

showList :: [ChannelEventUpdate'UpdateType] -> ShowS #

Show ChannelEventUpdate'UpdateType'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> ChannelEventUpdate'UpdateType'UnrecognizedValue -> ShowS #

show :: ChannelEventUpdate'UpdateType'UnrecognizedValue -> String #

showList :: [ChannelEventUpdate'UpdateType'UnrecognizedValue] -> ShowS #

Show ChannelGraph 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> ChannelGraph -> ShowS #

show :: ChannelGraph -> String #

showList :: [ChannelGraph] -> ShowS #

Show ChannelGraphRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> ChannelGraphRequest -> ShowS #

show :: ChannelGraphRequest -> String #

showList :: [ChannelGraphRequest] -> ShowS #

Show ChannelPoint 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> ChannelPoint -> ShowS #

show :: ChannelPoint -> String #

showList :: [ChannelPoint] -> ShowS #

Show ChannelPoint'FundingTxid 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> ChannelPoint'FundingTxid -> ShowS #

show :: ChannelPoint'FundingTxid -> String #

showList :: [ChannelPoint'FundingTxid] -> ShowS #

Show ClosedChannelUpdate 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> ClosedChannelUpdate -> ShowS #

show :: ClosedChannelUpdate -> String #

showList :: [ClosedChannelUpdate] -> ShowS #

Show CommitmentType 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> CommitmentType -> ShowS #

show :: CommitmentType -> String #

showList :: [CommitmentType] -> ShowS #

Show CommitmentType'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> CommitmentType'UnrecognizedValue -> ShowS #

show :: CommitmentType'UnrecognizedValue -> String #

showList :: [CommitmentType'UnrecognizedValue] -> ShowS #

Show EdgeLocator 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> EdgeLocator -> ShowS #

show :: EdgeLocator -> String #

showList :: [EdgeLocator] -> ShowS #

Show Feature 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> Feature -> ShowS #

show :: Feature -> String #

showList :: [Feature] -> ShowS #

Show FeatureBit 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> FeatureBit -> ShowS #

show :: FeatureBit -> String #

showList :: [FeatureBit] -> ShowS #

Show FeatureBit'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> FeatureBit'UnrecognizedValue -> ShowS #

show :: FeatureBit'UnrecognizedValue -> String #

showList :: [FeatureBit'UnrecognizedValue] -> ShowS #

Show FeeLimit 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> FeeLimit -> ShowS #

show :: FeeLimit -> String #

showList :: [FeeLimit] -> ShowS #

Show FeeLimit'Limit 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> FeeLimit'Limit -> ShowS #

show :: FeeLimit'Limit -> String #

showList :: [FeeLimit'Limit] -> ShowS #

Show FloatMetric 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> FloatMetric -> ShowS #

show :: FloatMetric -> String #

showList :: [FloatMetric] -> ShowS #

Show FundingPsbtFinalize 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> FundingPsbtFinalize -> ShowS #

show :: FundingPsbtFinalize -> String #

showList :: [FundingPsbtFinalize] -> ShowS #

Show FundingPsbtVerify 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> FundingPsbtVerify -> ShowS #

show :: FundingPsbtVerify -> String #

showList :: [FundingPsbtVerify] -> ShowS #

Show FundingShim 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> FundingShim -> ShowS #

show :: FundingShim -> String #

showList :: [FundingShim] -> ShowS #

Show FundingShim'Shim 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> FundingShim'Shim -> ShowS #

show :: FundingShim'Shim -> String #

showList :: [FundingShim'Shim] -> ShowS #

Show FundingShimCancel 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> FundingShimCancel -> ShowS #

show :: FundingShimCancel -> String #

showList :: [FundingShimCancel] -> ShowS #

Show FundingStateStepResp 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> FundingStateStepResp -> ShowS #

show :: FundingStateStepResp -> String #

showList :: [FundingStateStepResp] -> ShowS #

Show FundingTransitionMsg 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> FundingTransitionMsg -> ShowS #

show :: FundingTransitionMsg -> String #

showList :: [FundingTransitionMsg] -> ShowS #

Show FundingTransitionMsg'Trigger 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> FundingTransitionMsg'Trigger -> ShowS #

show :: FundingTransitionMsg'Trigger -> String #

showList :: [FundingTransitionMsg'Trigger] -> ShowS #

Show GraphTopologySubscription 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> GraphTopologySubscription -> ShowS #

show :: GraphTopologySubscription -> String #

showList :: [GraphTopologySubscription] -> ShowS #

Show GraphTopologyUpdate 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> GraphTopologyUpdate -> ShowS #

show :: GraphTopologyUpdate -> String #

showList :: [GraphTopologyUpdate] -> ShowS #

Show HTLC 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> HTLC -> ShowS #

show :: HTLC -> String #

showList :: [HTLC] -> ShowS #

Show Hop 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> Hop -> ShowS #

show :: Hop -> String #

showList :: [Hop] -> ShowS #

Show Hop'CustomRecordsEntry 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> Hop'CustomRecordsEntry -> ShowS #

show :: Hop'CustomRecordsEntry -> String #

showList :: [Hop'CustomRecordsEntry] -> ShowS #

Show HopHint 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> HopHint -> ShowS #

show :: HopHint -> String #

showList :: [HopHint] -> ShowS #

Show Initiator 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> Initiator -> ShowS #

show :: Initiator -> String #

showList :: [Initiator] -> ShowS #

Show Initiator'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> Initiator'UnrecognizedValue -> ShowS #

show :: Initiator'UnrecognizedValue -> String #

showList :: [Initiator'UnrecognizedValue] -> ShowS #

Show KeyDescriptor 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> KeyDescriptor -> ShowS #

show :: KeyDescriptor -> String #

showList :: [KeyDescriptor] -> ShowS #

Show KeyLocator 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> KeyLocator -> ShowS #

show :: KeyLocator -> String #

showList :: [KeyLocator] -> ShowS #

Show LightningNode 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> LightningNode -> ShowS #

show :: LightningNode -> String #

showList :: [LightningNode] -> ShowS #

Show LightningNode'FeaturesEntry 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> LightningNode'FeaturesEntry -> ShowS #

show :: LightningNode'FeaturesEntry -> String #

showList :: [LightningNode'FeaturesEntry] -> ShowS #

Show MPPRecord 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> MPPRecord -> ShowS #

show :: MPPRecord -> String #

showList :: [MPPRecord] -> ShowS #

Show NetworkInfo 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> NetworkInfo -> ShowS #

show :: NetworkInfo -> String #

showList :: [NetworkInfo] -> ShowS #

Show NetworkInfoRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> NetworkInfoRequest -> ShowS #

show :: NetworkInfoRequest -> String #

showList :: [NetworkInfoRequest] -> ShowS #

Show NodeAddress 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> NodeAddress -> ShowS #

show :: NodeAddress -> String #

showList :: [NodeAddress] -> ShowS #

Show NodeInfo 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> NodeInfo -> ShowS #

show :: NodeInfo -> String #

showList :: [NodeInfo] -> ShowS #

Show NodeInfoRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> NodeInfoRequest -> ShowS #

show :: NodeInfoRequest -> String #

showList :: [NodeInfoRequest] -> ShowS #

Show NodeMetricType 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> NodeMetricType -> ShowS #

show :: NodeMetricType -> String #

showList :: [NodeMetricType] -> ShowS #

Show NodeMetricType'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> NodeMetricType'UnrecognizedValue -> ShowS #

show :: NodeMetricType'UnrecognizedValue -> String #

showList :: [NodeMetricType'UnrecognizedValue] -> ShowS #

Show NodeMetricsRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> NodeMetricsRequest -> ShowS #

show :: NodeMetricsRequest -> String #

showList :: [NodeMetricsRequest] -> ShowS #

Show NodeMetricsResponse 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> NodeMetricsResponse -> ShowS #

show :: NodeMetricsResponse -> String #

showList :: [NodeMetricsResponse] -> ShowS #

Show NodeMetricsResponse'BetweennessCentralityEntry 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> NodeMetricsResponse'BetweennessCentralityEntry -> ShowS #

show :: NodeMetricsResponse'BetweennessCentralityEntry -> String #

showList :: [NodeMetricsResponse'BetweennessCentralityEntry] -> ShowS #

Show NodePair 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> NodePair -> ShowS #

show :: NodePair -> String #

showList :: [NodePair] -> ShowS #

Show NodeUpdate 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> NodeUpdate -> ShowS #

show :: NodeUpdate -> String #

showList :: [NodeUpdate] -> ShowS #

Show NodeUpdate'FeaturesEntry 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> NodeUpdate'FeaturesEntry -> ShowS #

show :: NodeUpdate'FeaturesEntry -> String #

showList :: [NodeUpdate'FeaturesEntry] -> ShowS #

Show OutPoint 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> OutPoint -> ShowS #

show :: OutPoint -> String #

showList :: [OutPoint] -> ShowS #

Show PendingChannelsRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> PendingChannelsRequest -> ShowS #

show :: PendingChannelsRequest -> String #

showList :: [PendingChannelsRequest] -> ShowS #

Show PendingChannelsResponse 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> PendingChannelsResponse -> ShowS #

show :: PendingChannelsResponse -> String #

showList :: [PendingChannelsResponse] -> ShowS #

Show PendingChannelsResponse'ClosedChannel 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> PendingChannelsResponse'ClosedChannel -> ShowS #

show :: PendingChannelsResponse'ClosedChannel -> String #

showList :: [PendingChannelsResponse'ClosedChannel] -> ShowS #

Show PendingChannelsResponse'Commitments 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> PendingChannelsResponse'Commitments -> ShowS #

show :: PendingChannelsResponse'Commitments -> String #

showList :: [PendingChannelsResponse'Commitments] -> ShowS #

Show PendingChannelsResponse'ForceClosedChannel 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> PendingChannelsResponse'ForceClosedChannel -> ShowS #

show :: PendingChannelsResponse'ForceClosedChannel -> String #

showList :: [PendingChannelsResponse'ForceClosedChannel] -> ShowS #

Show PendingChannelsResponse'ForceClosedChannel'AnchorState 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> PendingChannelsResponse'ForceClosedChannel'AnchorState -> ShowS #

show :: PendingChannelsResponse'ForceClosedChannel'AnchorState -> String #

showList :: [PendingChannelsResponse'ForceClosedChannel'AnchorState] -> ShowS #

Show PendingChannelsResponse'ForceClosedChannel'AnchorState'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> PendingChannelsResponse'ForceClosedChannel'AnchorState'UnrecognizedValue -> ShowS #

show :: PendingChannelsResponse'ForceClosedChannel'AnchorState'UnrecognizedValue -> String #

showList :: [PendingChannelsResponse'ForceClosedChannel'AnchorState'UnrecognizedValue] -> ShowS #

Show PendingChannelsResponse'PendingChannel 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> PendingChannelsResponse'PendingChannel -> ShowS #

show :: PendingChannelsResponse'PendingChannel -> String #

showList :: [PendingChannelsResponse'PendingChannel] -> ShowS #

Show PendingChannelsResponse'PendingOpenChannel 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> PendingChannelsResponse'PendingOpenChannel -> ShowS #

show :: PendingChannelsResponse'PendingOpenChannel -> String #

showList :: [PendingChannelsResponse'PendingOpenChannel] -> ShowS #

Show PendingChannelsResponse'WaitingCloseChannel 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> PendingChannelsResponse'WaitingCloseChannel -> ShowS #

show :: PendingChannelsResponse'WaitingCloseChannel -> String #

showList :: [PendingChannelsResponse'WaitingCloseChannel] -> ShowS #

Show PendingHTLC 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> PendingHTLC -> ShowS #

show :: PendingHTLC -> String #

showList :: [PendingHTLC] -> ShowS #

Show PendingUpdate 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> PendingUpdate -> ShowS #

show :: PendingUpdate -> String #

showList :: [PendingUpdate] -> ShowS #

Show PsbtShim 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> PsbtShim -> ShowS #

show :: PsbtShim -> String #

showList :: [PsbtShim] -> ShowS #

Show QueryRoutesRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> QueryRoutesRequest -> ShowS #

show :: QueryRoutesRequest -> String #

showList :: [QueryRoutesRequest] -> ShowS #

Show QueryRoutesRequest'DestCustomRecordsEntry 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> QueryRoutesRequest'DestCustomRecordsEntry -> ShowS #

show :: QueryRoutesRequest'DestCustomRecordsEntry -> String #

showList :: [QueryRoutesRequest'DestCustomRecordsEntry] -> ShowS #

Show QueryRoutesResponse 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> QueryRoutesResponse -> ShowS #

show :: QueryRoutesResponse -> String #

showList :: [QueryRoutesResponse] -> ShowS #

Show Resolution 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> Resolution -> ShowS #

show :: Resolution -> String #

showList :: [Resolution] -> ShowS #

Show ResolutionOutcome 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> ResolutionOutcome -> ShowS #

show :: ResolutionOutcome -> String #

showList :: [ResolutionOutcome] -> ShowS #

Show ResolutionOutcome'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> ResolutionOutcome'UnrecognizedValue -> ShowS #

show :: ResolutionOutcome'UnrecognizedValue -> String #

showList :: [ResolutionOutcome'UnrecognizedValue] -> ShowS #

Show ResolutionType 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> ResolutionType -> ShowS #

show :: ResolutionType -> String #

showList :: [ResolutionType] -> ShowS #

Show ResolutionType'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> ResolutionType'UnrecognizedValue -> ShowS #

show :: ResolutionType'UnrecognizedValue -> String #

showList :: [ResolutionType'UnrecognizedValue] -> ShowS #

Show Route 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> Route -> ShowS #

show :: Route -> String #

showList :: [Route] -> ShowS #

Show RouteHint 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> RouteHint -> ShowS #

show :: RouteHint -> String #

showList :: [RouteHint] -> ShowS #

Show RoutingPolicy 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> RoutingPolicy -> ShowS #

show :: RoutingPolicy -> String #

showList :: [RoutingPolicy] -> ShowS #

Show StopRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> StopRequest -> ShowS #

show :: StopRequest -> String #

showList :: [StopRequest] -> ShowS #

Show StopResponse 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> StopResponse -> ShowS #

show :: StopResponse -> String #

showList :: [StopResponse] -> ShowS #

Show WalletAccountBalance 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> WalletAccountBalance -> ShowS #

show :: WalletAccountBalance -> String #

showList :: [WalletAccountBalance] -> ShowS #

Show WalletBalanceRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> WalletBalanceRequest -> ShowS #

show :: WalletBalanceRequest -> String #

showList :: [WalletBalanceRequest] -> ShowS #

Show WalletBalanceResponse 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> WalletBalanceResponse -> ShowS #

show :: WalletBalanceResponse -> String #

showList :: [WalletBalanceResponse] -> ShowS #

Show WalletBalanceResponse'AccountBalanceEntry 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

showsPrec :: Int -> WalletBalanceResponse'AccountBalanceEntry -> ShowS #

show :: WalletBalanceResponse'AccountBalanceEntry -> String #

showList :: [WalletBalanceResponse'AccountBalanceEntry] -> ShowS #

Show AMP 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> AMP -> ShowS #

show :: AMP -> String #

showList :: [AMP] -> ShowS #

Show AMPInvoiceState 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> AMPInvoiceState -> ShowS #

show :: AMPInvoiceState -> String #

showList :: [AMPInvoiceState] -> ShowS #

Show AbandonChannelRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> AbandonChannelRequest -> ShowS #

show :: AbandonChannelRequest -> String #

showList :: [AbandonChannelRequest] -> ShowS #

Show AbandonChannelResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> AbandonChannelResponse -> ShowS #

show :: AbandonChannelResponse -> String #

showList :: [AbandonChannelResponse] -> ShowS #

Show AddInvoiceResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> AddInvoiceResponse -> ShowS #

show :: AddInvoiceResponse -> String #

showList :: [AddInvoiceResponse] -> ShowS #

Show BakeMacaroonRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> BakeMacaroonRequest -> ShowS #

show :: BakeMacaroonRequest -> String #

showList :: [BakeMacaroonRequest] -> ShowS #

Show BakeMacaroonResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> BakeMacaroonResponse -> ShowS #

show :: BakeMacaroonResponse -> String #

showList :: [BakeMacaroonResponse] -> ShowS #

Show ChanBackupExportRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> ChanBackupExportRequest -> ShowS #

show :: ChanBackupExportRequest -> String #

showList :: [ChanBackupExportRequest] -> ShowS #

Show ChanBackupSnapshot 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> ChanBackupSnapshot -> ShowS #

show :: ChanBackupSnapshot -> String #

showList :: [ChanBackupSnapshot] -> ShowS #

Show ChannelBackup 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> ChannelBackup -> ShowS #

show :: ChannelBackup -> String #

showList :: [ChannelBackup] -> ShowS #

Show ChannelBackupSubscription 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> ChannelBackupSubscription -> ShowS #

show :: ChannelBackupSubscription -> String #

showList :: [ChannelBackupSubscription] -> ShowS #

Show ChannelBackups 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> ChannelBackups -> ShowS #

show :: ChannelBackups -> String #

showList :: [ChannelBackups] -> ShowS #

Show ChannelFeeReport 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> ChannelFeeReport -> ShowS #

show :: ChannelFeeReport -> String #

showList :: [ChannelFeeReport] -> ShowS #

Show ChannelUpdate 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> ChannelUpdate -> ShowS #

show :: ChannelUpdate -> String #

showList :: [ChannelUpdate] -> ShowS #

Show CheckMacPermRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> CheckMacPermRequest -> ShowS #

show :: CheckMacPermRequest -> String #

showList :: [CheckMacPermRequest] -> ShowS #

Show CheckMacPermResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> CheckMacPermResponse -> ShowS #

show :: CheckMacPermResponse -> String #

showList :: [CheckMacPermResponse] -> ShowS #

Show DebugLevelRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> DebugLevelRequest -> ShowS #

show :: DebugLevelRequest -> String #

showList :: [DebugLevelRequest] -> ShowS #

Show DebugLevelResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> DebugLevelResponse -> ShowS #

show :: DebugLevelResponse -> String #

showList :: [DebugLevelResponse] -> ShowS #

Show DeleteAllPaymentsRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> DeleteAllPaymentsRequest -> ShowS #

show :: DeleteAllPaymentsRequest -> String #

showList :: [DeleteAllPaymentsRequest] -> ShowS #

Show DeleteAllPaymentsResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> DeleteAllPaymentsResponse -> ShowS #

show :: DeleteAllPaymentsResponse -> String #

showList :: [DeleteAllPaymentsResponse] -> ShowS #

Show DeleteMacaroonIDRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> DeleteMacaroonIDRequest -> ShowS #

show :: DeleteMacaroonIDRequest -> String #

showList :: [DeleteMacaroonIDRequest] -> ShowS #

Show DeleteMacaroonIDResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> DeleteMacaroonIDResponse -> ShowS #

show :: DeleteMacaroonIDResponse -> String #

showList :: [DeleteMacaroonIDResponse] -> ShowS #

Show DeletePaymentRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> DeletePaymentRequest -> ShowS #

show :: DeletePaymentRequest -> String #

showList :: [DeletePaymentRequest] -> ShowS #

Show DeletePaymentResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> DeletePaymentResponse -> ShowS #

show :: DeletePaymentResponse -> String #

showList :: [DeletePaymentResponse] -> ShowS #

Show ExportChannelBackupRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> ExportChannelBackupRequest -> ShowS #

show :: ExportChannelBackupRequest -> String #

showList :: [ExportChannelBackupRequest] -> ShowS #

Show FailedUpdate 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> FailedUpdate -> ShowS #

show :: FailedUpdate -> String #

showList :: [FailedUpdate] -> ShowS #

Show Failure 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> Failure -> ShowS #

show :: Failure -> String #

showList :: [Failure] -> ShowS #

Show Failure'FailureCode 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> Failure'FailureCode -> ShowS #

show :: Failure'FailureCode -> String #

showList :: [Failure'FailureCode] -> ShowS #

Show Failure'FailureCode'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> Failure'FailureCode'UnrecognizedValue -> ShowS #

show :: Failure'FailureCode'UnrecognizedValue -> String #

showList :: [Failure'FailureCode'UnrecognizedValue] -> ShowS #

Show FeeReportRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> FeeReportRequest -> ShowS #

show :: FeeReportRequest -> String #

showList :: [FeeReportRequest] -> ShowS #

Show FeeReportResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> FeeReportResponse -> ShowS #

show :: FeeReportResponse -> String #

showList :: [FeeReportResponse] -> ShowS #

Show ForwardingEvent 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> ForwardingEvent -> ShowS #

show :: ForwardingEvent -> String #

showList :: [ForwardingEvent] -> ShowS #

Show ForwardingHistoryRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> ForwardingHistoryRequest -> ShowS #

show :: ForwardingHistoryRequest -> String #

showList :: [ForwardingHistoryRequest] -> ShowS #

Show ForwardingHistoryResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> ForwardingHistoryResponse -> ShowS #

show :: ForwardingHistoryResponse -> String #

showList :: [ForwardingHistoryResponse] -> ShowS #

Show HTLCAttempt 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> HTLCAttempt -> ShowS #

show :: HTLCAttempt -> String #

showList :: [HTLCAttempt] -> ShowS #

Show HTLCAttempt'HTLCStatus 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> HTLCAttempt'HTLCStatus -> ShowS #

show :: HTLCAttempt'HTLCStatus -> String #

showList :: [HTLCAttempt'HTLCStatus] -> ShowS #

Show HTLCAttempt'HTLCStatus'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> HTLCAttempt'HTLCStatus'UnrecognizedValue -> ShowS #

show :: HTLCAttempt'HTLCStatus'UnrecognizedValue -> String #

showList :: [HTLCAttempt'HTLCStatus'UnrecognizedValue] -> ShowS #

Show InterceptFeedback 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> InterceptFeedback -> ShowS #

show :: InterceptFeedback -> String #

showList :: [InterceptFeedback] -> ShowS #

Show Invoice 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> Invoice -> ShowS #

show :: Invoice -> String #

showList :: [Invoice] -> ShowS #

Show Invoice'AmpInvoiceStateEntry 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> Invoice'AmpInvoiceStateEntry -> ShowS #

show :: Invoice'AmpInvoiceStateEntry -> String #

showList :: [Invoice'AmpInvoiceStateEntry] -> ShowS #

Show Invoice'FeaturesEntry 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> Invoice'FeaturesEntry -> ShowS #

show :: Invoice'FeaturesEntry -> String #

showList :: [Invoice'FeaturesEntry] -> ShowS #

Show Invoice'InvoiceState 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> Invoice'InvoiceState -> ShowS #

show :: Invoice'InvoiceState -> String #

showList :: [Invoice'InvoiceState] -> ShowS #

Show Invoice'InvoiceState'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> Invoice'InvoiceState'UnrecognizedValue -> ShowS #

show :: Invoice'InvoiceState'UnrecognizedValue -> String #

showList :: [Invoice'InvoiceState'UnrecognizedValue] -> ShowS #

Show InvoiceHTLC 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> InvoiceHTLC -> ShowS #

show :: InvoiceHTLC -> String #

showList :: [InvoiceHTLC] -> ShowS #

Show InvoiceHTLC'CustomRecordsEntry 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> InvoiceHTLC'CustomRecordsEntry -> ShowS #

show :: InvoiceHTLC'CustomRecordsEntry -> String #

showList :: [InvoiceHTLC'CustomRecordsEntry] -> ShowS #

Show InvoiceHTLCState 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> InvoiceHTLCState -> ShowS #

show :: InvoiceHTLCState -> String #

showList :: [InvoiceHTLCState] -> ShowS #

Show InvoiceHTLCState'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> InvoiceHTLCState'UnrecognizedValue -> ShowS #

show :: InvoiceHTLCState'UnrecognizedValue -> String #

showList :: [InvoiceHTLCState'UnrecognizedValue] -> ShowS #

Show InvoiceSubscription 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> InvoiceSubscription -> ShowS #

show :: InvoiceSubscription -> String #

showList :: [InvoiceSubscription] -> ShowS #

Show ListInvoiceRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> ListInvoiceRequest -> ShowS #

show :: ListInvoiceRequest -> String #

showList :: [ListInvoiceRequest] -> ShowS #

Show ListInvoiceResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> ListInvoiceResponse -> ShowS #

show :: ListInvoiceResponse -> String #

showList :: [ListInvoiceResponse] -> ShowS #

Show ListMacaroonIDsRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> ListMacaroonIDsRequest -> ShowS #

show :: ListMacaroonIDsRequest -> String #

showList :: [ListMacaroonIDsRequest] -> ShowS #

Show ListMacaroonIDsResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> ListMacaroonIDsResponse -> ShowS #

show :: ListMacaroonIDsResponse -> String #

showList :: [ListMacaroonIDsResponse] -> ShowS #

Show ListPaymentsRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> ListPaymentsRequest -> ShowS #

show :: ListPaymentsRequest -> String #

showList :: [ListPaymentsRequest] -> ShowS #

Show ListPaymentsResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> ListPaymentsResponse -> ShowS #

show :: ListPaymentsResponse -> String #

showList :: [ListPaymentsResponse] -> ShowS #

Show ListPermissionsRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> ListPermissionsRequest -> ShowS #

show :: ListPermissionsRequest -> String #

showList :: [ListPermissionsRequest] -> ShowS #

Show ListPermissionsResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> ListPermissionsResponse -> ShowS #

show :: ListPermissionsResponse -> String #

showList :: [ListPermissionsResponse] -> ShowS #

Show ListPermissionsResponse'MethodPermissionsEntry 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> ListPermissionsResponse'MethodPermissionsEntry -> ShowS #

show :: ListPermissionsResponse'MethodPermissionsEntry -> String #

showList :: [ListPermissionsResponse'MethodPermissionsEntry] -> ShowS #

Show MacaroonId 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> MacaroonId -> ShowS #

show :: MacaroonId -> String #

showList :: [MacaroonId] -> ShowS #

Show MacaroonPermission 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> MacaroonPermission -> ShowS #

show :: MacaroonPermission -> String #

showList :: [MacaroonPermission] -> ShowS #

Show MacaroonPermissionList 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> MacaroonPermissionList -> ShowS #

show :: MacaroonPermissionList -> String #

showList :: [MacaroonPermissionList] -> ShowS #

Show MiddlewareRegistration 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> MiddlewareRegistration -> ShowS #

show :: MiddlewareRegistration -> String #

showList :: [MiddlewareRegistration] -> ShowS #

Show MultiChanBackup 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> MultiChanBackup -> ShowS #

show :: MultiChanBackup -> String #

showList :: [MultiChanBackup] -> ShowS #

Show Op 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> Op -> ShowS #

show :: Op -> String #

showList :: [Op] -> ShowS #

Show PayReq 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> PayReq -> ShowS #

show :: PayReq -> String #

showList :: [PayReq] -> ShowS #

Show PayReq'FeaturesEntry 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> PayReq'FeaturesEntry -> ShowS #

show :: PayReq'FeaturesEntry -> String #

showList :: [PayReq'FeaturesEntry] -> ShowS #

Show PayReqString 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> PayReqString -> ShowS #

show :: PayReqString -> String #

showList :: [PayReqString] -> ShowS #

Show Payment 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> Payment -> ShowS #

show :: Payment -> String #

showList :: [Payment] -> ShowS #

Show Payment'PaymentStatus 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> Payment'PaymentStatus -> ShowS #

show :: Payment'PaymentStatus -> String #

showList :: [Payment'PaymentStatus] -> ShowS #

Show Payment'PaymentStatus'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> Payment'PaymentStatus'UnrecognizedValue -> ShowS #

show :: Payment'PaymentStatus'UnrecognizedValue -> String #

showList :: [Payment'PaymentStatus'UnrecognizedValue] -> ShowS #

Show PaymentFailureReason 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> PaymentFailureReason -> ShowS #

show :: PaymentFailureReason -> String #

showList :: [PaymentFailureReason] -> ShowS #

Show PaymentFailureReason'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> PaymentFailureReason'UnrecognizedValue -> ShowS #

show :: PaymentFailureReason'UnrecognizedValue -> String #

showList :: [PaymentFailureReason'UnrecognizedValue] -> ShowS #

Show PaymentHash 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> PaymentHash -> ShowS #

show :: PaymentHash -> String #

showList :: [PaymentHash] -> ShowS #

Show PolicyUpdateRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> PolicyUpdateRequest -> ShowS #

show :: PolicyUpdateRequest -> String #

showList :: [PolicyUpdateRequest] -> ShowS #

Show PolicyUpdateRequest'Scope 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> PolicyUpdateRequest'Scope -> ShowS #

show :: PolicyUpdateRequest'Scope -> String #

showList :: [PolicyUpdateRequest'Scope] -> ShowS #

Show PolicyUpdateResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> PolicyUpdateResponse -> ShowS #

show :: PolicyUpdateResponse -> String #

showList :: [PolicyUpdateResponse] -> ShowS #

Show RPCMessage 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> RPCMessage -> ShowS #

show :: RPCMessage -> String #

showList :: [RPCMessage] -> ShowS #

Show RPCMiddlewareRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> RPCMiddlewareRequest -> ShowS #

show :: RPCMiddlewareRequest -> String #

showList :: [RPCMiddlewareRequest] -> ShowS #

Show RPCMiddlewareRequest'InterceptType 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> RPCMiddlewareRequest'InterceptType -> ShowS #

show :: RPCMiddlewareRequest'InterceptType -> String #

showList :: [RPCMiddlewareRequest'InterceptType] -> ShowS #

Show RPCMiddlewareResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> RPCMiddlewareResponse -> ShowS #

show :: RPCMiddlewareResponse -> String #

showList :: [RPCMiddlewareResponse] -> ShowS #

Show RPCMiddlewareResponse'MiddlewareMessage 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> RPCMiddlewareResponse'MiddlewareMessage -> ShowS #

show :: RPCMiddlewareResponse'MiddlewareMessage -> String #

showList :: [RPCMiddlewareResponse'MiddlewareMessage] -> ShowS #

Show RestoreBackupResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> RestoreBackupResponse -> ShowS #

show :: RestoreBackupResponse -> String #

showList :: [RestoreBackupResponse] -> ShowS #

Show RestoreChanBackupRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> RestoreChanBackupRequest -> ShowS #

show :: RestoreChanBackupRequest -> String #

showList :: [RestoreChanBackupRequest] -> ShowS #

Show RestoreChanBackupRequest'Backup 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> RestoreChanBackupRequest'Backup -> ShowS #

show :: RestoreChanBackupRequest'Backup -> String #

showList :: [RestoreChanBackupRequest'Backup] -> ShowS #

Show SetID 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> SetID -> ShowS #

show :: SetID -> String #

showList :: [SetID] -> ShowS #

Show StreamAuth 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> StreamAuth -> ShowS #

show :: StreamAuth -> String #

showList :: [StreamAuth] -> ShowS #

Show UpdateFailure 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> UpdateFailure -> ShowS #

show :: UpdateFailure -> String #

showList :: [UpdateFailure] -> ShowS #

Show UpdateFailure'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> UpdateFailure'UnrecognizedValue -> ShowS #

show :: UpdateFailure'UnrecognizedValue -> String #

showList :: [UpdateFailure'UnrecognizedValue] -> ShowS #

Show VerifyChanBackupResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

showsPrec :: Int -> VerifyChanBackupResponse -> ShowS #

show :: VerifyChanBackupResponse -> String #

showList :: [VerifyChanBackupResponse] -> ShowS #

Show BuildRouteRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> BuildRouteRequest -> ShowS #

show :: BuildRouteRequest -> String #

showList :: [BuildRouteRequest] -> ShowS #

Show BuildRouteResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> BuildRouteResponse -> ShowS #

show :: BuildRouteResponse -> String #

showList :: [BuildRouteResponse] -> ShowS #

Show ChanStatusAction 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> ChanStatusAction -> ShowS #

show :: ChanStatusAction -> String #

showList :: [ChanStatusAction] -> ShowS #

Show ChanStatusAction'UnrecognizedValue 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> ChanStatusAction'UnrecognizedValue -> ShowS #

show :: ChanStatusAction'UnrecognizedValue -> String #

showList :: [ChanStatusAction'UnrecognizedValue] -> ShowS #

Show CircuitKey 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> CircuitKey -> ShowS #

show :: CircuitKey -> String #

showList :: [CircuitKey] -> ShowS #

Show FailureDetail 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> FailureDetail -> ShowS #

show :: FailureDetail -> String #

showList :: [FailureDetail] -> ShowS #

Show FailureDetail'UnrecognizedValue 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> FailureDetail'UnrecognizedValue -> ShowS #

show :: FailureDetail'UnrecognizedValue -> String #

showList :: [FailureDetail'UnrecognizedValue] -> ShowS #

Show ForwardEvent 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> ForwardEvent -> ShowS #

show :: ForwardEvent -> String #

showList :: [ForwardEvent] -> ShowS #

Show ForwardFailEvent 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> ForwardFailEvent -> ShowS #

show :: ForwardFailEvent -> String #

showList :: [ForwardFailEvent] -> ShowS #

Show ForwardHtlcInterceptRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> ForwardHtlcInterceptRequest -> ShowS #

show :: ForwardHtlcInterceptRequest -> String #

showList :: [ForwardHtlcInterceptRequest] -> ShowS #

Show ForwardHtlcInterceptRequest'CustomRecordsEntry 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> ForwardHtlcInterceptRequest'CustomRecordsEntry -> ShowS #

show :: ForwardHtlcInterceptRequest'CustomRecordsEntry -> String #

showList :: [ForwardHtlcInterceptRequest'CustomRecordsEntry] -> ShowS #

Show ForwardHtlcInterceptResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> ForwardHtlcInterceptResponse -> ShowS #

show :: ForwardHtlcInterceptResponse -> String #

showList :: [ForwardHtlcInterceptResponse] -> ShowS #

Show GetMissionControlConfigRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> GetMissionControlConfigRequest -> ShowS #

show :: GetMissionControlConfigRequest -> String #

showList :: [GetMissionControlConfigRequest] -> ShowS #

Show GetMissionControlConfigResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> GetMissionControlConfigResponse -> ShowS #

show :: GetMissionControlConfigResponse -> String #

showList :: [GetMissionControlConfigResponse] -> ShowS #

Show HtlcEvent 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> HtlcEvent -> ShowS #

show :: HtlcEvent -> String #

showList :: [HtlcEvent] -> ShowS #

Show HtlcEvent'Event 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> HtlcEvent'Event -> ShowS #

show :: HtlcEvent'Event -> String #

showList :: [HtlcEvent'Event] -> ShowS #

Show HtlcEvent'EventType 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> HtlcEvent'EventType -> ShowS #

show :: HtlcEvent'EventType -> String #

showList :: [HtlcEvent'EventType] -> ShowS #

Show HtlcEvent'EventType'UnrecognizedValue 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> HtlcEvent'EventType'UnrecognizedValue -> ShowS #

show :: HtlcEvent'EventType'UnrecognizedValue -> String #

showList :: [HtlcEvent'EventType'UnrecognizedValue] -> ShowS #

Show HtlcInfo 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> HtlcInfo -> ShowS #

show :: HtlcInfo -> String #

showList :: [HtlcInfo] -> ShowS #

Show LinkFailEvent 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> LinkFailEvent -> ShowS #

show :: LinkFailEvent -> String #

showList :: [LinkFailEvent] -> ShowS #

Show MissionControlConfig 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> MissionControlConfig -> ShowS #

show :: MissionControlConfig -> String #

showList :: [MissionControlConfig] -> ShowS #

Show PairData 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> PairData -> ShowS #

show :: PairData -> String #

showList :: [PairData] -> ShowS #

Show PairHistory 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> PairHistory -> ShowS #

show :: PairHistory -> String #

showList :: [PairHistory] -> ShowS #

Show PaymentState 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> PaymentState -> ShowS #

show :: PaymentState -> String #

showList :: [PaymentState] -> ShowS #

Show PaymentState'UnrecognizedValue 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> PaymentState'UnrecognizedValue -> ShowS #

show :: PaymentState'UnrecognizedValue -> String #

showList :: [PaymentState'UnrecognizedValue] -> ShowS #

Show PaymentStatus 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> PaymentStatus -> ShowS #

show :: PaymentStatus -> String #

showList :: [PaymentStatus] -> ShowS #

Show QueryMissionControlRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> QueryMissionControlRequest -> ShowS #

show :: QueryMissionControlRequest -> String #

showList :: [QueryMissionControlRequest] -> ShowS #

Show QueryMissionControlResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> QueryMissionControlResponse -> ShowS #

show :: QueryMissionControlResponse -> String #

showList :: [QueryMissionControlResponse] -> ShowS #

Show QueryProbabilityRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> QueryProbabilityRequest -> ShowS #

show :: QueryProbabilityRequest -> String #

showList :: [QueryProbabilityRequest] -> ShowS #

Show QueryProbabilityResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> QueryProbabilityResponse -> ShowS #

show :: QueryProbabilityResponse -> String #

showList :: [QueryProbabilityResponse] -> ShowS #

Show ResetMissionControlRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> ResetMissionControlRequest -> ShowS #

show :: ResetMissionControlRequest -> String #

showList :: [ResetMissionControlRequest] -> ShowS #

Show ResetMissionControlResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> ResetMissionControlResponse -> ShowS #

show :: ResetMissionControlResponse -> String #

showList :: [ResetMissionControlResponse] -> ShowS #

Show ResolveHoldForwardAction 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> ResolveHoldForwardAction -> ShowS #

show :: ResolveHoldForwardAction -> String #

showList :: [ResolveHoldForwardAction] -> ShowS #

Show ResolveHoldForwardAction'UnrecognizedValue 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> ResolveHoldForwardAction'UnrecognizedValue -> ShowS #

show :: ResolveHoldForwardAction'UnrecognizedValue -> String #

showList :: [ResolveHoldForwardAction'UnrecognizedValue] -> ShowS #

Show RouteFeeRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> RouteFeeRequest -> ShowS #

show :: RouteFeeRequest -> String #

showList :: [RouteFeeRequest] -> ShowS #

Show RouteFeeResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> RouteFeeResponse -> ShowS #

show :: RouteFeeResponse -> String #

showList :: [RouteFeeResponse] -> ShowS #

Show SendPaymentRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> SendPaymentRequest -> ShowS #

show :: SendPaymentRequest -> String #

showList :: [SendPaymentRequest] -> ShowS #

Show SendPaymentRequest'DestCustomRecordsEntry 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> SendPaymentRequest'DestCustomRecordsEntry -> ShowS #

show :: SendPaymentRequest'DestCustomRecordsEntry -> String #

showList :: [SendPaymentRequest'DestCustomRecordsEntry] -> ShowS #

Show SendToRouteRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> SendToRouteRequest -> ShowS #

show :: SendToRouteRequest -> String #

showList :: [SendToRouteRequest] -> ShowS #

Show SendToRouteResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> SendToRouteResponse -> ShowS #

show :: SendToRouteResponse -> String #

showList :: [SendToRouteResponse] -> ShowS #

Show SetMissionControlConfigRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> SetMissionControlConfigRequest -> ShowS #

show :: SetMissionControlConfigRequest -> String #

showList :: [SetMissionControlConfigRequest] -> ShowS #

Show SetMissionControlConfigResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> SetMissionControlConfigResponse -> ShowS #

show :: SetMissionControlConfigResponse -> String #

showList :: [SetMissionControlConfigResponse] -> ShowS #

Show SettleEvent 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> SettleEvent -> ShowS #

show :: SettleEvent -> String #

showList :: [SettleEvent] -> ShowS #

Show SubscribeHtlcEventsRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> SubscribeHtlcEventsRequest -> ShowS #

show :: SubscribeHtlcEventsRequest -> String #

showList :: [SubscribeHtlcEventsRequest] -> ShowS #

Show TrackPaymentRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> TrackPaymentRequest -> ShowS #

show :: TrackPaymentRequest -> String #

showList :: [TrackPaymentRequest] -> ShowS #

Show UpdateChanStatusRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> UpdateChanStatusRequest -> ShowS #

show :: UpdateChanStatusRequest -> String #

showList :: [UpdateChanStatusRequest] -> ShowS #

Show UpdateChanStatusResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> UpdateChanStatusResponse -> ShowS #

show :: UpdateChanStatusResponse -> String #

showList :: [UpdateChanStatusResponse] -> ShowS #

Show XImportMissionControlRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> XImportMissionControlRequest -> ShowS #

show :: XImportMissionControlRequest -> String #

showList :: [XImportMissionControlRequest] -> ShowS #

Show XImportMissionControlResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

showsPrec :: Int -> XImportMissionControlResponse -> ShowS #

show :: XImportMissionControlResponse -> String #

showList :: [XImportMissionControlResponse] -> ShowS #

Show InputScript 
Instance details

Defined in Proto.Signrpc.Signer

Methods

showsPrec :: Int -> InputScript -> ShowS #

show :: InputScript -> String #

showList :: [InputScript] -> ShowS #

Show InputScriptResp 
Instance details

Defined in Proto.Signrpc.Signer

Methods

showsPrec :: Int -> InputScriptResp -> ShowS #

show :: InputScriptResp -> String #

showList :: [InputScriptResp] -> ShowS #

Show KeyDescriptor 
Instance details

Defined in Proto.Signrpc.Signer

Methods

showsPrec :: Int -> KeyDescriptor -> ShowS #

show :: KeyDescriptor -> String #

showList :: [KeyDescriptor] -> ShowS #

Show KeyLocator 
Instance details

Defined in Proto.Signrpc.Signer

Methods

showsPrec :: Int -> KeyLocator -> ShowS #

show :: KeyLocator -> String #

showList :: [KeyLocator] -> ShowS #

Show SharedKeyRequest 
Instance details

Defined in Proto.Signrpc.Signer

Methods

showsPrec :: Int -> SharedKeyRequest -> ShowS #

show :: SharedKeyRequest -> String #

showList :: [SharedKeyRequest] -> ShowS #

Show SharedKeyResponse 
Instance details

Defined in Proto.Signrpc.Signer

Methods

showsPrec :: Int -> SharedKeyResponse -> ShowS #

show :: SharedKeyResponse -> String #

showList :: [SharedKeyResponse] -> ShowS #

Show SignDescriptor 
Instance details

Defined in Proto.Signrpc.Signer

Methods

showsPrec :: Int -> SignDescriptor -> ShowS #

show :: SignDescriptor -> String #

showList :: [SignDescriptor] -> ShowS #

Show SignMessageReq 
Instance details

Defined in Proto.Signrpc.Signer

Methods

showsPrec :: Int -> SignMessageReq -> ShowS #

show :: SignMessageReq -> String #

showList :: [SignMessageReq] -> ShowS #

Show SignMessageResp 
Instance details

Defined in Proto.Signrpc.Signer

Methods

showsPrec :: Int -> SignMessageResp -> ShowS #

show :: SignMessageResp -> String #

showList :: [SignMessageResp] -> ShowS #

Show SignReq 
Instance details

Defined in Proto.Signrpc.Signer

Methods

showsPrec :: Int -> SignReq -> ShowS #

show :: SignReq -> String #

showList :: [SignReq] -> ShowS #

Show SignResp 
Instance details

Defined in Proto.Signrpc.Signer

Methods

showsPrec :: Int -> SignResp -> ShowS #

show :: SignResp -> String #

showList :: [SignResp] -> ShowS #

Show TxOut 
Instance details

Defined in Proto.Signrpc.Signer

Methods

showsPrec :: Int -> TxOut -> ShowS #

show :: TxOut -> String #

showList :: [TxOut] -> ShowS #

Show VerifyMessageReq 
Instance details

Defined in Proto.Signrpc.Signer

Methods

showsPrec :: Int -> VerifyMessageReq -> ShowS #

show :: VerifyMessageReq -> String #

showList :: [VerifyMessageReq] -> ShowS #

Show VerifyMessageResp 
Instance details

Defined in Proto.Signrpc.Signer

Methods

showsPrec :: Int -> VerifyMessageResp -> ShowS #

show :: VerifyMessageResp -> String #

showList :: [VerifyMessageResp] -> ShowS #

Show Account 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> Account -> ShowS #

show :: Account -> String #

showList :: [Account] -> ShowS #

Show AddrRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> AddrRequest -> ShowS #

show :: AddrRequest -> String #

showList :: [AddrRequest] -> ShowS #

Show AddrResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> AddrResponse -> ShowS #

show :: AddrResponse -> String #

showList :: [AddrResponse] -> ShowS #

Show AddressType 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> AddressType -> ShowS #

show :: AddressType -> String #

showList :: [AddressType] -> ShowS #

Show AddressType'UnrecognizedValue 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> AddressType'UnrecognizedValue -> ShowS #

show :: AddressType'UnrecognizedValue -> String #

showList :: [AddressType'UnrecognizedValue] -> ShowS #

Show BumpFeeRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> BumpFeeRequest -> ShowS #

show :: BumpFeeRequest -> String #

showList :: [BumpFeeRequest] -> ShowS #

Show BumpFeeResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> BumpFeeResponse -> ShowS #

show :: BumpFeeResponse -> String #

showList :: [BumpFeeResponse] -> ShowS #

Show EstimateFeeRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> EstimateFeeRequest -> ShowS #

show :: EstimateFeeRequest -> String #

showList :: [EstimateFeeRequest] -> ShowS #

Show EstimateFeeResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> EstimateFeeResponse -> ShowS #

show :: EstimateFeeResponse -> String #

showList :: [EstimateFeeResponse] -> ShowS #

Show FinalizePsbtRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> FinalizePsbtRequest -> ShowS #

show :: FinalizePsbtRequest -> String #

showList :: [FinalizePsbtRequest] -> ShowS #

Show FinalizePsbtResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> FinalizePsbtResponse -> ShowS #

show :: FinalizePsbtResponse -> String #

showList :: [FinalizePsbtResponse] -> ShowS #

Show FundPsbtRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> FundPsbtRequest -> ShowS #

show :: FundPsbtRequest -> String #

showList :: [FundPsbtRequest] -> ShowS #

Show FundPsbtRequest'Fees 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> FundPsbtRequest'Fees -> ShowS #

show :: FundPsbtRequest'Fees -> String #

showList :: [FundPsbtRequest'Fees] -> ShowS #

Show FundPsbtRequest'Template 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> FundPsbtRequest'Template -> ShowS #

show :: FundPsbtRequest'Template -> String #

showList :: [FundPsbtRequest'Template] -> ShowS #

Show FundPsbtResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> FundPsbtResponse -> ShowS #

show :: FundPsbtResponse -> String #

showList :: [FundPsbtResponse] -> ShowS #

Show ImportAccountRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> ImportAccountRequest -> ShowS #

show :: ImportAccountRequest -> String #

showList :: [ImportAccountRequest] -> ShowS #

Show ImportAccountResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> ImportAccountResponse -> ShowS #

show :: ImportAccountResponse -> String #

showList :: [ImportAccountResponse] -> ShowS #

Show ImportPublicKeyRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> ImportPublicKeyRequest -> ShowS #

show :: ImportPublicKeyRequest -> String #

showList :: [ImportPublicKeyRequest] -> ShowS #

Show ImportPublicKeyResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> ImportPublicKeyResponse -> ShowS #

show :: ImportPublicKeyResponse -> String #

showList :: [ImportPublicKeyResponse] -> ShowS #

Show KeyReq 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> KeyReq -> ShowS #

show :: KeyReq -> String #

showList :: [KeyReq] -> ShowS #

Show LabelTransactionRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> LabelTransactionRequest -> ShowS #

show :: LabelTransactionRequest -> String #

showList :: [LabelTransactionRequest] -> ShowS #

Show LabelTransactionResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> LabelTransactionResponse -> ShowS #

show :: LabelTransactionResponse -> String #

showList :: [LabelTransactionResponse] -> ShowS #

Show LeaseOutputRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> LeaseOutputRequest -> ShowS #

show :: LeaseOutputRequest -> String #

showList :: [LeaseOutputRequest] -> ShowS #

Show LeaseOutputResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> LeaseOutputResponse -> ShowS #

show :: LeaseOutputResponse -> String #

showList :: [LeaseOutputResponse] -> ShowS #

Show ListAccountsRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> ListAccountsRequest -> ShowS #

show :: ListAccountsRequest -> String #

showList :: [ListAccountsRequest] -> ShowS #

Show ListAccountsResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> ListAccountsResponse -> ShowS #

show :: ListAccountsResponse -> String #

showList :: [ListAccountsResponse] -> ShowS #

Show ListLeasesRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> ListLeasesRequest -> ShowS #

show :: ListLeasesRequest -> String #

showList :: [ListLeasesRequest] -> ShowS #

Show ListLeasesResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> ListLeasesResponse -> ShowS #

show :: ListLeasesResponse -> String #

showList :: [ListLeasesResponse] -> ShowS #

Show ListSweepsRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> ListSweepsRequest -> ShowS #

show :: ListSweepsRequest -> String #

showList :: [ListSweepsRequest] -> ShowS #

Show ListSweepsResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> ListSweepsResponse -> ShowS #

show :: ListSweepsResponse -> String #

showList :: [ListSweepsResponse] -> ShowS #

Show ListSweepsResponse'Sweeps 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> ListSweepsResponse'Sweeps -> ShowS #

show :: ListSweepsResponse'Sweeps -> String #

showList :: [ListSweepsResponse'Sweeps] -> ShowS #

Show ListSweepsResponse'TransactionIDs 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> ListSweepsResponse'TransactionIDs -> ShowS #

show :: ListSweepsResponse'TransactionIDs -> String #

showList :: [ListSweepsResponse'TransactionIDs] -> ShowS #

Show ListUnspentRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> ListUnspentRequest -> ShowS #

show :: ListUnspentRequest -> String #

showList :: [ListUnspentRequest] -> ShowS #

Show ListUnspentResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> ListUnspentResponse -> ShowS #

show :: ListUnspentResponse -> String #

showList :: [ListUnspentResponse] -> ShowS #

Show PendingSweep 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> PendingSweep -> ShowS #

show :: PendingSweep -> String #

showList :: [PendingSweep] -> ShowS #

Show PendingSweepsRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> PendingSweepsRequest -> ShowS #

show :: PendingSweepsRequest -> String #

showList :: [PendingSweepsRequest] -> ShowS #

Show PendingSweepsResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> PendingSweepsResponse -> ShowS #

show :: PendingSweepsResponse -> String #

showList :: [PendingSweepsResponse] -> ShowS #

Show PublishResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> PublishResponse -> ShowS #

show :: PublishResponse -> String #

showList :: [PublishResponse] -> ShowS #

Show ReleaseOutputRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> ReleaseOutputRequest -> ShowS #

show :: ReleaseOutputRequest -> String #

showList :: [ReleaseOutputRequest] -> ShowS #

Show ReleaseOutputResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> ReleaseOutputResponse -> ShowS #

show :: ReleaseOutputResponse -> String #

showList :: [ReleaseOutputResponse] -> ShowS #

Show SendOutputsRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> SendOutputsRequest -> ShowS #

show :: SendOutputsRequest -> String #

showList :: [SendOutputsRequest] -> ShowS #

Show SendOutputsResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> SendOutputsResponse -> ShowS #

show :: SendOutputsResponse -> String #

showList :: [SendOutputsResponse] -> ShowS #

Show Transaction 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> Transaction -> ShowS #

show :: Transaction -> String #

showList :: [Transaction] -> ShowS #

Show TxTemplate 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> TxTemplate -> ShowS #

show :: TxTemplate -> String #

showList :: [TxTemplate] -> ShowS #

Show TxTemplate'OutputsEntry 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> TxTemplate'OutputsEntry -> ShowS #

show :: TxTemplate'OutputsEntry -> String #

showList :: [TxTemplate'OutputsEntry] -> ShowS #

Show UtxoLease 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> UtxoLease -> ShowS #

show :: UtxoLease -> String #

showList :: [UtxoLease] -> ShowS #

Show WitnessType 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> WitnessType -> ShowS #

show :: WitnessType -> String #

showList :: [WitnessType] -> ShowS #

Show WitnessType'UnrecognizedValue 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

showsPrec :: Int -> WitnessType'UnrecognizedValue -> ShowS #

show :: WitnessType'UnrecognizedValue -> String #

showList :: [WitnessType'UnrecognizedValue] -> ShowS #

Show ChangePasswordRequest 
Instance details

Defined in Proto.Walletunlocker

Methods

showsPrec :: Int -> ChangePasswordRequest -> ShowS #

show :: ChangePasswordRequest -> String #

showList :: [ChangePasswordRequest] -> ShowS #

Show ChangePasswordResponse 
Instance details

Defined in Proto.Walletunlocker

Methods

showsPrec :: Int -> ChangePasswordResponse -> ShowS #

show :: ChangePasswordResponse -> String #

showList :: [ChangePasswordResponse] -> ShowS #

Show GenSeedRequest 
Instance details

Defined in Proto.Walletunlocker

Methods

showsPrec :: Int -> GenSeedRequest -> ShowS #

show :: GenSeedRequest -> String #

showList :: [GenSeedRequest] -> ShowS #

Show GenSeedResponse 
Instance details

Defined in Proto.Walletunlocker

Methods

showsPrec :: Int -> GenSeedResponse -> ShowS #

show :: GenSeedResponse -> String #

showList :: [GenSeedResponse] -> ShowS #

Show InitWalletRequest 
Instance details

Defined in Proto.Walletunlocker

Methods

showsPrec :: Int -> InitWalletRequest -> ShowS #

show :: InitWalletRequest -> String #

showList :: [InitWalletRequest] -> ShowS #

Show InitWalletResponse 
Instance details

Defined in Proto.Walletunlocker

Methods

showsPrec :: Int -> InitWalletResponse -> ShowS #

show :: InitWalletResponse -> String #

showList :: [InitWalletResponse] -> ShowS #

Show UnlockWalletRequest 
Instance details

Defined in Proto.Walletunlocker

Methods

showsPrec :: Int -> UnlockWalletRequest -> ShowS #

show :: UnlockWalletRequest -> String #

showList :: [UnlockWalletRequest] -> ShowS #

Show UnlockWalletResponse 
Instance details

Defined in Proto.Walletunlocker

Methods

showsPrec :: Int -> UnlockWalletResponse -> ShowS #

show :: UnlockWalletResponse -> String #

showList :: [UnlockWalletResponse] -> ShowS #

Show WatchOnly 
Instance details

Defined in Proto.Walletunlocker

Methods

showsPrec :: Int -> WatchOnly -> ShowS #

show :: WatchOnly -> String #

showList :: [WatchOnly] -> ShowS #

Show WatchOnlyAccount 
Instance details

Defined in Proto.Walletunlocker

Methods

showsPrec :: Int -> WatchOnlyAccount -> ShowS #

show :: WatchOnlyAccount -> String #

showList :: [WatchOnlyAccount] -> ShowS #

Show LogLevel 
Instance details

Defined in Control.Monad.Logger

Show NullError 
Instance details

Defined in Data.NonNull

Methods

showsPrec :: Int -> NullError -> ShowS #

show :: NullError -> String #

showList :: [NullError] -> ShowS #

Show AddrInfo 
Instance details

Defined in Network.Socket.Info

Show AddrInfoFlag 
Instance details

Defined in Network.Socket.Info

Show NameInfoFlag 
Instance details

Defined in Network.Socket.Info

Show Family 
Instance details

Defined in Network.Socket.Types

Show PortNumber 
Instance details

Defined in Network.Socket.Types

Show Socket 
Instance details

Defined in Network.Socket.Types

Show SocketType 
Instance details

Defined in Network.Socket.Types

Show Block 
Instance details

Defined in Network.Bitcoin.BlockChain

Methods

showsPrec :: Int -> Block -> ShowS #

show :: Block -> String #

showList :: [Block] -> ShowS #

Show BlockChainInfo 
Instance details

Defined in Network.Bitcoin.BlockChain

Methods

showsPrec :: Int -> BlockChainInfo -> ShowS #

show :: BlockChainInfo -> String #

showList :: [BlockChainInfo] -> ShowS #

Show BlockVerbose 
Instance details

Defined in Network.Bitcoin.BlockChain

Methods

showsPrec :: Int -> BlockVerbose -> ShowS #

show :: BlockVerbose -> String #

showList :: [BlockVerbose] -> 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 BitcoinRpcError 
Instance details

Defined in Network.Bitcoin.Internal

Methods

showsPrec :: Int -> BitcoinRpcError -> ShowS #

show :: BitcoinRpcError -> String #

showList :: [BitcoinRpcError] -> ShowS #

Show BlockInfo 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

showsPrec :: Int -> BlockInfo -> ShowS #

show :: BlockInfo -> String #

showList :: [BlockInfo] -> ShowS #

Show DecodedPsbt 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

showsPrec :: Int -> DecodedPsbt -> ShowS #

show :: DecodedPsbt -> String #

showList :: [DecodedPsbt] -> ShowS #

Show DecodedRawTransaction 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

showsPrec :: Int -> DecodedRawTransaction -> ShowS #

show :: DecodedRawTransaction -> String #

showList :: [DecodedRawTransaction] -> ShowS #

Show RawTransactionInfo 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

showsPrec :: Int -> RawTransactionInfo -> ShowS #

show :: RawTransactionInfo -> String #

showList :: [RawTransactionInfo] -> ShowS #

Show ScriptPubKey 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

showsPrec :: Int -> ScriptPubKey -> ShowS #

show :: ScriptPubKey -> String #

showList :: [ScriptPubKey] -> ShowS #

Show ScriptSig 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

showsPrec :: Int -> ScriptSig -> ShowS #

show :: ScriptSig -> String #

showList :: [ScriptSig] -> ShowS #

Show TxIn 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

showsPrec :: Int -> TxIn -> ShowS #

show :: TxIn -> String #

showList :: [TxIn] -> ShowS #

Show TxOut 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

showsPrec :: Int -> TxOut -> ShowS #

show :: TxOut -> String #

showList :: [TxOut] -> ShowS #

Show TxnOutputType 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

showsPrec :: Int -> TxnOutputType -> ShowS #

show :: TxnOutputType -> String #

showList :: [TxnOutputType] -> ShowS #

Show UnspentTransaction 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

showsPrec :: Int -> UnspentTransaction -> ShowS #

show :: UnspentTransaction -> String #

showList :: [UnspentTransaction] -> ShowS #

Show BitcoinException 
Instance details

Defined in Network.Bitcoin.Types

Methods

showsPrec :: Int -> BitcoinException -> ShowS #

show :: BitcoinException -> String #

showList :: [BitcoinException] -> ShowS #

Show TransactionID 
Instance details

Defined in Network.Bitcoin.Types

Methods

showsPrec :: Int -> TransactionID -> ShowS #

show :: TransactionID -> String #

showList :: [TransactionID] -> ShowS #

Show AddrInfo 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

showsPrec :: Int -> AddrInfo -> ShowS #

show :: AddrInfo -> String #

showList :: [AddrInfo] -> ShowS #

Show AddressInfo 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

showsPrec :: Int -> AddressInfo -> ShowS #

show :: AddressInfo -> String #

showList :: [AddressInfo] -> ShowS #

Show BitcoindInfo 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

showsPrec :: Int -> BitcoindInfo -> ShowS #

show :: BitcoindInfo -> String #

showList :: [BitcoindInfo] -> ShowS #

Show DetailedTransaction 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

showsPrec :: Int -> DetailedTransaction -> ShowS #

show :: DetailedTransaction -> String #

showList :: [DetailedTransaction] -> ShowS #

Show DetailedTransactionDetails 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

showsPrec :: Int -> DetailedTransactionDetails -> ShowS #

show :: DetailedTransactionDetails -> String #

showList :: [DetailedTransactionDetails] -> ShowS #

Show ReceivedByAccount 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

showsPrec :: Int -> ReceivedByAccount -> ShowS #

show :: ReceivedByAccount -> String #

showList :: [ReceivedByAccount] -> ShowS #

Show ReceivedByAddress 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

showsPrec :: Int -> ReceivedByAddress -> ShowS #

show :: ReceivedByAddress -> String #

showList :: [ReceivedByAddress] -> ShowS #

Show ScrPubKey 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

showsPrec :: Int -> ScrPubKey -> ShowS #

show :: ScrPubKey -> String #

showList :: [ScrPubKey] -> ShowS #

Show SimpleTransaction 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

showsPrec :: Int -> SimpleTransaction -> ShowS #

show :: SimpleTransaction -> String #

showList :: [SimpleTransaction] -> ShowS #

Show SinceBlock 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

showsPrec :: Int -> SinceBlock -> ShowS #

show :: SinceBlock -> String #

showList :: [SinceBlock] -> ShowS #

Show TransactionCategory 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

showsPrec :: Int -> TransactionCategory -> ShowS #

show :: TransactionCategory -> String #

showList :: [TransactionCategory] -> ShowS #

Show URI 
Instance details

Defined in Network.URI

Methods

showsPrec :: Int -> URI -> ShowS #

show :: URI -> String #

showList :: [URI] -> ShowS #

Show URIAuth 
Instance details

Defined in Network.URI

Show OverflowNatural 
Instance details

Defined in Database.Persist.Class.PersistField

Show ConstraintNameDB 
Instance details

Defined in Database.Persist.Names

Show ConstraintNameHS 
Instance details

Defined in Database.Persist.Names

Show EntityNameDB 
Instance details

Defined in Database.Persist.Names

Show EntityNameHS 
Instance details

Defined in Database.Persist.Names

Show FieldNameDB 
Instance details

Defined in Database.Persist.Names

Show FieldNameHS 
Instance details

Defined in Database.Persist.Names

Show LiteralType 
Instance details

Defined in Database.Persist.PersistValue

Show PersistValue 
Instance details

Defined in Database.Persist.PersistValue

Show ForeignFieldReference 
Instance details

Defined in Database.Persist.Quasi.Internal

Show Line 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

showsPrec :: Int -> Line -> ShowS #

show :: Line -> String #

showList :: [Line] -> ShowS #

Show LinesWithComments 
Instance details

Defined in Database.Persist.Quasi.Internal

Show PrimarySpec 
Instance details

Defined in Database.Persist.Quasi.Internal

Show Token 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

showsPrec :: Int -> Token -> ShowS #

show :: Token -> String #

showList :: [Token] -> ShowS #

Show UnboundCompositeDef 
Instance details

Defined in Database.Persist.Quasi.Internal

Show UnboundEntityDef 
Instance details

Defined in Database.Persist.Quasi.Internal

Show UnboundFieldDef 
Instance details

Defined in Database.Persist.Quasi.Internal

Show UnboundForeignDef 
Instance details

Defined in Database.Persist.Quasi.Internal

Show UnboundForeignFieldList 
Instance details

Defined in Database.Persist.Quasi.Internal

Show UnboundIdDef 
Instance details

Defined in Database.Persist.Quasi.Internal

Show PersistUnsafeMigrationException

This Show instance renders an error message suitable for printing to the console. This is a little dodgy, but since GHC uses Show instances when displaying uncaught exceptions, we have little choice.

Instance details

Defined in Database.Persist.Sql.Migration

Show Column 
Instance details

Defined in Database.Persist.Sql.Types

Show ColumnReference 
Instance details

Defined in Database.Persist.Sql.Types

Show ConnectionPoolConfig 
Instance details

Defined in Database.Persist.Sql.Types

Show PersistentSqlException 
Instance details

Defined in Database.Persist.Sql.Types

Show IsolationLevel 
Instance details

Defined in Database.Persist.SqlBackend.Internal.IsolationLevel

Show FTTypeConDescr 
Instance details

Defined in Database.Persist.TH

Methods

showsPrec :: Int -> FTTypeConDescr -> ShowS #

show :: FTTypeConDescr -> String #

showList :: [FTTypeConDescr] -> ShowS #

Show SqlTypeExp 
Instance details

Defined in Database.Persist.TH

Methods

showsPrec :: Int -> SqlTypeExp -> ShowS #

show :: SqlTypeExp -> String #

showList :: [SqlTypeExp] -> ShowS #

Show CascadeAction 
Instance details

Defined in Database.Persist.Types.Base

Show Checkmark 
Instance details

Defined in Database.Persist.Types.Base

Show CompositeDef 
Instance details

Defined in Database.Persist.Types.Base

Show EmbedEntityDef 
Instance details

Defined in Database.Persist.Types.Base

Show EmbedFieldDef 
Instance details

Defined in Database.Persist.Types.Base

Show EntityDef 
Instance details

Defined in Database.Persist.Types.Base

Show EntityIdDef 
Instance details

Defined in Database.Persist.Types.Base

Show FieldAttr 
Instance details

Defined in Database.Persist.Types.Base

Show FieldCascade 
Instance details

Defined in Database.Persist.Types.Base

Show FieldDef 
Instance details

Defined in Database.Persist.Types.Base

Show FieldType 
Instance details

Defined in Database.Persist.Types.Base

Show ForeignDef 
Instance details

Defined in Database.Persist.Types.Base

Show IsNullable 
Instance details

Defined in Database.Persist.Types.Base

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

Show PersistFilter 
Instance details

Defined in Database.Persist.Types.Base

Show PersistUpdate 
Instance details

Defined in Database.Persist.Types.Base

Show ReferenceDef 
Instance details

Defined in Database.Persist.Types.Base

Show SelfEmbed 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> SelfEmbed -> ShowS #

show :: SelfEmbed -> String #

showList :: [SelfEmbed] -> ShowS #

Show SqlType 
Instance details

Defined in Database.Persist.Types.Base

Show UniqueDef 
Instance details

Defined in Database.Persist.Types.Base

Show UpdateException 
Instance details

Defined in Database.Persist.Types.Base

Show WhyNullable 
Instance details

Defined in Database.Persist.Types.Base

Show MigrationPath 
Instance details

Defined in Database.Persist.Migration.Core

Show Operation 
Instance details

Defined in Database.Persist.Migration.Operation

Show MigrateSql 
Instance details

Defined in Database.Persist.Migration.Utils.Sql

Show AlterColumn 
Instance details

Defined in Database.Persist.Postgresql

Methods

showsPrec :: Int -> AlterColumn -> ShowS #

show :: AlterColumn -> String #

showList :: [AlterColumn] -> ShowS #

Show AlterDB 
Instance details

Defined in Database.Persist.Postgresql

Methods

showsPrec :: Int -> AlterDB -> ShowS #

show :: AlterDB -> String #

showList :: [AlterDB] -> ShowS #

Show AlterTable 
Instance details

Defined in Database.Persist.Postgresql

Methods

showsPrec :: Int -> AlterTable -> ShowS #

show :: AlterTable -> String #

showList :: [AlterTable] -> ShowS #

Show PostgresConf 
Instance details

Defined in Database.Persist.Postgresql

Show PostgresServerVersionError 
Instance details

Defined in Database.Persist.Postgresql

Methods

showsPrec :: Int -> PostgresServerVersionError -> ShowS #

show :: PostgresServerVersionError -> String #

showList :: [PostgresServerVersionError] -> ShowS #

Show ConnectInfo 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Show FormatError 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Show QueryError 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Show SqlError 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Show Mode 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

showsPrec :: Int -> Mode -> ShowS #

show :: Mode -> String #

showList :: [Mode] -> ShowS #

Show Style 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

showsPrec :: Int -> Style -> ShowS #

show :: Style -> String #

showList :: [Style] -> ShowS #

Show TextDetails 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Show Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Methods

showsPrec :: Int -> Doc -> ShowS #

show :: Doc -> String #

showList :: [Doc] -> ShowS #

Show ColorOptions 
Instance details

Defined in Text.Pretty.Simple.Internal.Color

Show Style 
Instance details

Defined in Text.Pretty.Simple.Internal.Color

Methods

showsPrec :: Int -> Style -> ShowS #

show :: Style -> String #

showList :: [Style] -> ShowS #

Show Expr 
Instance details

Defined in Text.Pretty.Simple.Internal.Expr

Methods

showsPrec :: Int -> Expr -> ShowS #

show :: Expr -> String #

showList :: [Expr] -> ShowS #

Show CheckColorTty 
Instance details

Defined in Text.Pretty.Simple.Internal.Printer

Show OutputOptions 
Instance details

Defined in Text.Pretty.Simple.Internal.Printer

Show StringOutputStyle 
Instance details

Defined in Text.Pretty.Simple.Internal.Printer

Show FusionDepth 
Instance details

Defined in Prettyprinter.Internal

Show LayoutOptions 
Instance details

Defined in Prettyprinter.Internal

Show PageWidth 
Instance details

Defined in Prettyprinter.Internal

Show AnsiStyle 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Show Bold 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

showsPrec :: Int -> Bold -> ShowS #

show :: Bold -> String #

showList :: [Bold] -> ShowS #

Show Color 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

showsPrec :: Int -> Color -> ShowS #

show :: Color -> String #

showList :: [Color] -> ShowS #

Show Intensity 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Show Italicized 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Show Layer 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

showsPrec :: Int -> Layer -> ShowS #

show :: Layer -> String #

showList :: [Layer] -> ShowS #

Show Underlined 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Show ByteArray

Behavior changed in 0.7.2.0. Before 0.7.2.0, this instance rendered 8-bit words less than 16 as a single hexadecimal digit (e.g. 13 was 0xD). Starting with 0.7.2.0, all 8-bit words are represented as two digits (e.g. 13 is 0x0D).

Since: primitive-0.6.3.0

Instance details

Defined in Data.Primitive.ByteArray

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 StreamingType 
Instance details

Defined in Data.ProtoLens.Service.Types

Methods

showsPrec :: Int -> StreamingType -> ShowS #

show :: StreamingType -> String #

showList :: [StreamingType] -> ShowS #

Show StdGen 
Instance details

Defined in System.Random.Internal

Show InvalidAccess 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Show ResourceCleanupException 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Show ReleaseType 
Instance details

Defined in Data.Acquire.Internal

Show AsyncExceptionWrapper 
Instance details

Defined in Control.Exception.Safe

Show StringException 
Instance details

Defined in Control.Exception.Safe

Show SyncExceptionWrapper 
Instance details

Defined in Control.Exception.Safe

Show Scientific

See formatScientific if you need more control over the rendering.

Instance details

Defined in Data.Scientific

Show Msg 
Instance details

Defined in Crypto.Secp256k1

Methods

showsPrec :: Int -> Msg -> ShowS #

show :: Msg -> String #

showList :: [Msg] -> ShowS #

Show PubKey 
Instance details

Defined in Crypto.Secp256k1

Show SecKey 
Instance details

Defined in Crypto.Secp256k1

Show Sig 
Instance details

Defined in Crypto.Secp256k1

Methods

showsPrec :: Int -> Sig -> ShowS #

show :: Sig -> String #

showList :: [Sig] -> ShowS #

Show Tweak 
Instance details

Defined in Crypto.Secp256k1

Methods

showsPrec :: Int -> Tweak -> ShowS #

show :: Tweak -> String #

showList :: [Tweak] -> ShowS #

Show Binding 
Instance details

Defined in Text.Hamlet.Parse

Methods

showsPrec :: Int -> Binding -> ShowS #

show :: Binding -> String #

showList :: [Binding] -> ShowS #

Show Content 
Instance details

Defined in Text.Hamlet.Parse

Methods

showsPrec :: Int -> Content -> ShowS #

show :: Content -> String #

showList :: [Content] -> ShowS #

Show DataConstr 
Instance details

Defined in Text.Hamlet.Parse

Methods

showsPrec :: Int -> DataConstr -> ShowS #

show :: DataConstr -> String #

showList :: [DataConstr] -> ShowS #

Show Doc 
Instance details

Defined in Text.Hamlet.Parse

Methods

showsPrec :: Int -> Doc -> ShowS #

show :: Doc -> String #

showList :: [Doc] -> ShowS #

Show Line 
Instance details

Defined in Text.Hamlet.Parse

Methods

showsPrec :: Int -> Line -> ShowS #

show :: Line -> String #

showList :: [Line] -> ShowS #

Show Module 
Instance details

Defined in Text.Hamlet.Parse

Methods

showsPrec :: Int -> Module -> ShowS #

show :: Module -> String #

showList :: [Module] -> ShowS #

Show NewlineStyle 
Instance details

Defined in Text.Hamlet.Parse

Show TagPiece 
Instance details

Defined in Text.Hamlet.Parse

Methods

showsPrec :: Int -> TagPiece -> ShowS #

show :: TagPiece -> String #

showList :: [TagPiece] -> ShowS #

Show Content 
Instance details

Defined in Text.Internal.Css

Methods

showsPrec :: Int -> Content -> ShowS #

show :: Content -> String #

showList :: [Content] -> ShowS #

Show AbsoluteSize 
Instance details

Defined in Text.Internal.CssCommon

Show AbsoluteUnit 
Instance details

Defined in Text.Internal.CssCommon

Show Color 
Instance details

Defined in Text.Internal.CssCommon

Methods

showsPrec :: Int -> Color -> ShowS #

show :: Color -> String #

showList :: [Color] -> ShowS #

Show EmSize 
Instance details

Defined in Text.Internal.CssCommon

Show ExSize 
Instance details

Defined in Text.Internal.CssCommon

Show PercentageSize 
Instance details

Defined in Text.Internal.CssCommon

Show PixelSize 
Instance details

Defined in Text.Internal.CssCommon

Show Content 
Instance details

Defined in Text.Shakespeare

Methods

showsPrec :: Int -> Content -> ShowS #

show :: Content -> String #

showList :: [Content] -> ShowS #

Show VarType 
Instance details

Defined in Text.Shakespeare

Show Deref 
Instance details

Defined in Text.Shakespeare.Base

Methods

showsPrec :: Int -> Deref -> ShowS #

show :: Deref -> String #

showList :: [Deref] -> ShowS #

Show Ident 
Instance details

Defined in Text.Shakespeare.Base

Methods

showsPrec :: Int -> Ident -> ShowS #

show :: Ident -> String #

showList :: [Ident] -> ShowS #

Show HostPreference 
Instance details

Defined in Data.Streaming.Network.Internal

Show Leniency 
Instance details

Defined in Data.String.Conv

Show AnnLookup 
Instance details

Defined in Language.Haskell.TH.Syntax

Show AnnTarget 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Bang 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Bang -> ShowS #

show :: Bang -> String #

showList :: [Bang] -> ShowS #

Show Body 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Body -> ShowS #

show :: Body -> String #

showList :: [Body] -> ShowS #

Show Bytes 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Bytes -> ShowS #

show :: Bytes -> String #

showList :: [Bytes] -> ShowS #

Show Callconv 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Clause 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Con 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Con -> ShowS #

show :: Con -> String #

showList :: [Con] -> ShowS #

Show Dec 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Dec -> ShowS #

show :: Dec -> String #

showList :: [Dec] -> ShowS #

Show DecidedStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Show DerivClause 
Instance details

Defined in Language.Haskell.TH.Syntax

Show DerivStrategy 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Exp 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Exp -> ShowS #

show :: Exp -> String #

showList :: [Exp] -> ShowS #

Show FamilyResultSig 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Fixity 
Instance details

Defined in Language.Haskell.TH.Syntax

Show FixityDirection 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Foreign 
Instance details

Defined in Language.Haskell.TH.Syntax

Show FunDep 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Guard 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Guard -> ShowS #

show :: Guard -> String #

showList :: [Guard] -> ShowS #

Show Info 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Info -> ShowS #

show :: Info -> String #

showList :: [Info] -> ShowS #

Show InjectivityAnn 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Inline 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Lit 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Lit -> ShowS #

show :: Lit -> String #

showList :: [Lit] -> ShowS #

Show Loc 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Loc -> ShowS #

show :: Loc -> String #

showList :: [Loc] -> ShowS #

Show Match 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Match -> ShowS #

show :: Match -> String #

showList :: [Match] -> ShowS #

Show ModName 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Module 
Instance details

Defined in Language.Haskell.TH.Syntax

Show ModuleInfo 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Name 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Name -> ShowS #

show :: Name -> String #

showList :: [Name] -> ShowS #

Show NameFlavour 
Instance details

Defined in Language.Haskell.TH.Syntax

Show NameSpace 
Instance details

Defined in Language.Haskell.TH.Syntax

Show OccName 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Overlap 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Pat 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Pat -> ShowS #

show :: Pat -> String #

showList :: [Pat] -> ShowS #

Show PatSynArgs 
Instance details

Defined in Language.Haskell.TH.Syntax

Show PatSynDir 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Phases 
Instance details

Defined in Language.Haskell.TH.Syntax

Show PkgName 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Pragma 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Range 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Range -> ShowS #

show :: Range -> String #

showList :: [Range] -> ShowS #

Show Role 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Role -> ShowS #

show :: Role -> String #

showList :: [Role] -> ShowS #

Show RuleBndr 
Instance details

Defined in Language.Haskell.TH.Syntax

Show RuleMatch 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Safety 
Instance details

Defined in Language.Haskell.TH.Syntax

Show SourceStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Show SourceUnpackedness 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Specificity 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Stmt 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Stmt -> ShowS #

show :: Stmt -> String #

showList :: [Stmt] -> ShowS #

Show TyLit 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> TyLit -> ShowS #

show :: TyLit -> String #

showList :: [TyLit] -> ShowS #

Show TySynEqn 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Type 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Type -> ShowS #

show :: Type -> String #

showList :: [Type] -> ShowS #

Show TypeFamilyHead 
Instance details

Defined in Language.Haskell.TH.Syntax

Show CodePoint 
Instance details

Defined in Data.Text.Encoding

Methods

showsPrec :: Int -> CodePoint -> ShowS #

show :: CodePoint -> String #

showList :: [CodePoint] -> ShowS #

Show DecoderState 
Instance details

Defined in Data.Text.Encoding

Methods

showsPrec :: Int -> DecoderState -> ShowS #

show :: DecoderState -> String #

showList :: [DecoderState] -> ShowS #

Show Decoding 
Instance details

Defined in Data.Text.Encoding

Show UnicodeException 
Instance details

Defined in Data.Text.Encoding.Error

Show Builder 
Instance details

Defined in Data.Text.Internal.Builder

Show ShortText 
Instance details

Defined in Data.Text.Short.Internal

Show ConstructorInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Show ConstructorVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Show DatatypeInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Show DatatypeVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Show FieldStrictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Show Strictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Show Unpackedness 
Instance details

Defined in Language.Haskell.TH.Datatype

Show DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Show NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Show TimeLocale 
Instance details

Defined in Data.Time.Format.Locale

Show LocalTime 
Instance details

Defined in Data.Time.LocalTime.Internal.LocalTime

Show TimeOfDay 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeOfDay

Show ZonedTime 
Instance details

Defined in Data.Time.LocalTime.Internal.ZonedTime

Show ClientHooks 
Instance details

Defined in Network.TLS.Parameters

Show ClientParams 
Instance details

Defined in Network.TLS.Parameters

Show DebugParams 
Instance details

Defined in Network.TLS.Parameters

Show EMSMode 
Instance details

Defined in Network.TLS.Parameters

Show GroupUsage 
Instance details

Defined in Network.TLS.Parameters

Show ServerHooks 
Instance details

Defined in Network.TLS.Parameters

Show ServerParams 
Instance details

Defined in Network.TLS.Parameters

Show Shared 
Instance details

Defined in Network.TLS.Parameters

Show Supported 
Instance details

Defined in Network.TLS.Parameters

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 AsyncExceptionWrapper

Since: unliftio-0.1.0.0

Instance details

Defined in UnliftIO.Exception

Show StringException

Since: unliftio-0.1.0.0

Instance details

Defined in UnliftIO.Exception

Show SyncExceptionWrapper

Since: unliftio-0.1.0.0

Instance details

Defined in UnliftIO.Exception

Show ConcException 
Instance details

Defined in UnliftIO.Internals.Async

Show UUID

Pretty prints a UUID (without quotation marks). See also toString.

>>> show nil
"00000000-0000-0000-0000-000000000000"
Instance details

Defined in Data.UUID.Types.Internal

Methods

showsPrec :: Int -> UUID -> ShowS #

show :: UUID -> String #

showList :: [UUID] -> ShowS #

Show UnpackedUUID 
Instance details

Defined in Data.UUID.Types.Internal

Show FilePart 
Instance details

Defined in Network.Wai.Internal

Show Request 
Instance details

Defined in Network.Wai.Internal

Show RequestBodyLength 
Instance details

Defined in Network.Wai.Internal

Show Piece 
Instance details

Defined in WaiAppStatic.Types

Methods

showsPrec :: Int -> Piece -> ShowS #

show :: Piece -> String #

showList :: [Piece] -> ShowS #

Show Bound 
Instance details

Defined in Network.Wai.Parse

Methods

showsPrec :: Int -> Bound -> ShowS #

show :: Bound -> String #

showList :: [Bound] -> ShowS #

Show FileInfo 
Instance details

Defined in Network.Wai.Handler.Warp.FileInfoCache

Show PushPromise 
Instance details

Defined in Network.Wai.Handler.Warp.HTTP2.Types

Show ExceptionInsideResponseBody 
Instance details

Defined in Network.Wai.Handler.Warp.Types

Methods

showsPrec :: Int -> ExceptionInsideResponseBody -> ShowS #

show :: ExceptionInsideResponseBody -> String #

showList :: [ExceptionInsideResponseBody] -> ShowS #

Show InvalidRequest 
Instance details

Defined in Network.Wai.Handler.Warp.Types

Show WarpTLSException 
Instance details

Defined in Network.Wai.Handler.WarpTLS

Show OnInsecure 
Instance details

Defined in Network.Wai.Handler.WarpTLS.Internal

Show Int128 
Instance details

Defined in Data.WideWord.Int128

Show Word128 
Instance details

Defined in Data.WideWord.Word128

Show Word256 
Instance details

Defined in Data.WideWord.Word256

Show Content 
Instance details

Defined in Data.XML.Types

Show Doctype 
Instance details

Defined in Data.XML.Types

Show Document 
Instance details

Defined in Data.XML.Types

Show Element 
Instance details

Defined in Data.XML.Types

Show Event 
Instance details

Defined in Data.XML.Types

Methods

showsPrec :: Int -> Event -> ShowS #

show :: Event -> String #

showList :: [Event] -> ShowS #

Show ExternalID 
Instance details

Defined in Data.XML.Types

Show Instruction 
Instance details

Defined in Data.XML.Types

Show Miscellaneous 
Instance details

Defined in Data.XML.Types

Show Name 
Instance details

Defined in Data.XML.Types

Methods

showsPrec :: Int -> Name -> ShowS #

show :: Name -> String #

showList :: [Name] -> ShowS #

Show Node 
Instance details

Defined in Data.XML.Types

Methods

showsPrec :: Int -> Node -> ShowS #

show :: Node -> String #

showList :: [Node] -> ShowS #

Show Prologue 
Instance details

Defined in Data.XML.Types

Show ParseException 
Instance details

Defined in Data.Yaml.Internal

Show Warning 
Instance details

Defined in Data.Yaml.Internal

Show AuthException 
Instance details

Defined in Yesod.Auth

Show Etag 
Instance details

Defined in Yesod.Core.Handler

Methods

showsPrec :: Int -> Etag -> ShowS #

show :: Etag -> String #

showList :: [Etag] -> ShowS #

Show AuthResult 
Instance details

Defined in Yesod.Core.Types

Show ClientSessionDateCache 
Instance details

Defined in Yesod.Core.Types

Show ErrorResponse 
Instance details

Defined in Yesod.Core.Types

Show HandlerContents 
Instance details

Defined in Yesod.Core.Types

Show Header 
Instance details

Defined in Yesod.Core.Types

Show SessionCookie 
Instance details

Defined in Yesod.Core.Types

Show TypeTree 
Instance details

Defined in Yesod.Routes.Parse

Methods

showsPrec :: Int -> TypeTree -> ShowS #

show :: TypeTree -> String #

showList :: [TypeTree] -> ShowS #

Show BootstrapFormLayout 
Instance details

Defined in Yesod.Form.Bootstrap3

Show BootstrapGridOptions 
Instance details

Defined in Yesod.Form.Bootstrap3

Show Textarea 
Instance details

Defined in Yesod.Form.Fields

Show FormMessage 
Instance details

Defined in Yesod.Form.Types

Show Ints 
Instance details

Defined in Yesod.Form.Types

Methods

showsPrec :: Int -> Ints -> ShowS #

show :: Ints -> String #

showList :: [Ints] -> ShowS #

Show CompressionLevel 
Instance details

Defined in Codec.Compression.Zlib.Stream

Show CompressionStrategy 
Instance details

Defined in Codec.Compression.Zlib.Stream

Show DictionaryHash 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

showsPrec :: Int -> DictionaryHash -> ShowS #

show :: DictionaryHash -> String #

showList :: [DictionaryHash] -> ShowS #

Show Format 
Instance details

Defined in Codec.Compression.Zlib.Stream

Show MemoryLevel 
Instance details

Defined in Codec.Compression.Zlib.Stream

Show Method 
Instance details

Defined in Codec.Compression.Zlib.Stream

Show WindowBits 
Instance details

Defined in Codec.Compression.Zlib.Stream

Show Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Methods

showsPrec :: Int -> Word8 -> ShowS #

show :: Word8 -> String #

showList :: [Word8] -> 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 ()

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> () -> ShowS #

show :: () -> String #

showList :: [()] -> ShowS #

Show Bool

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Bool -> ShowS #

show :: Bool -> String #

showList :: [Bool] -> ShowS #

Show Char

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Char -> ShowS #

show :: Char -> String #

showList :: [Char] -> ShowS #

Show Int

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Int -> ShowS #

show :: Int -> String #

showList :: [Int] -> ShowS #

Show RuntimeRep

Since: base-4.11.0.0

Instance details

Defined in GHC.Show

Show VecCount

Since: base-4.11.0.0

Instance details

Defined in GHC.Show

Show VecElem

Since: base-4.11.0.0

Instance details

Defined in GHC.Show

Show Word

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Word -> ShowS #

show :: Word -> String #

showList :: [Word] -> ShowS #

Show a => Show (Only a) 
Instance details

Defined in Data.Tuple.Only

Methods

showsPrec :: Int -> Only a -> ShowS #

show :: Only a -> String #

showList :: [Only a] -> ShowS #

Show (Digest t) 
Instance details

Defined in Data.Digest.Pure.SHA

Methods

showsPrec :: Int -> Digest t -> ShowS #

show :: Digest t -> String #

showList :: [Digest t] -> ShowS #

Show (Encoding' a) 
Instance details

Defined in Data.Aeson.Encoding.Internal

Show a => Show (IResult a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

showsPrec :: Int -> IResult a -> ShowS #

show :: IResult a -> String #

showList :: [IResult a] -> ShowS #

Show a => Show (Result a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

showsPrec :: Int -> Result a -> ShowS #

show :: Result a -> String #

showList :: [Result a] -> ShowS #

Show a => Show (ZipList a)

Since: base-4.7.0.0

Instance details

Defined in Control.Applicative

Methods

showsPrec :: Int -> ZipList a -> ShowS #

show :: ZipList a -> String #

showList :: [ZipList a] -> ShowS #

Show a => Show (Complex a)

Since: base-2.1

Instance details

Defined in Data.Complex

Methods

showsPrec :: Int -> Complex a -> ShowS #

show :: Complex a -> String #

showList :: [Complex a] -> ShowS #

Show a => Show (Identity a)

This instance would be equivalent to the derived instances of the Identity newtype if the runIdentity field were removed

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

showsPrec :: Int -> Identity a -> ShowS #

show :: Identity a -> String #

showList :: [Identity a] -> ShowS #

Show a => Show (First a)

Since: base-2.1

Instance details

Defined in Data.Monoid

Methods

showsPrec :: Int -> First a -> ShowS #

show :: First a -> String #

showList :: [First a] -> ShowS #

Show a => Show (Last a)

Since: base-2.1

Instance details

Defined in Data.Monoid

Methods

showsPrec :: Int -> Last a -> ShowS #

show :: Last a -> String #

showList :: [Last a] -> ShowS #

Show a => Show (Down a)

This instance would be equivalent to the derived instances of the Down newtype if the getDown field were removed

Since: base-4.7.0.0

Instance details

Defined in Data.Ord

Methods

showsPrec :: Int -> Down a -> ShowS #

show :: Down a -> String #

showList :: [Down a] -> ShowS #

Show a => Show (First a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

showsPrec :: Int -> First a -> ShowS #

show :: First a -> String #

showList :: [First a] -> ShowS #

Show a => Show (Last a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

showsPrec :: Int -> Last a -> ShowS #

show :: Last a -> String #

showList :: [Last a] -> ShowS #

Show a => Show (Max a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

showsPrec :: Int -> Max a -> ShowS #

show :: Max a -> String #

showList :: [Max a] -> ShowS #

Show a => Show (Min a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

showsPrec :: Int -> Min a -> ShowS #

show :: Min a -> String #

showList :: [Min a] -> ShowS #

Show 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 m => Show (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Show a => Show (Dual a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

showsPrec :: Int -> Dual a -> ShowS #

show :: Dual a -> String #

showList :: [Dual a] -> ShowS #

Show a => Show (Product a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

showsPrec :: Int -> Product a -> ShowS #

show :: Product a -> String #

showList :: [Product a] -> ShowS #

Show a => Show (Sum a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

showsPrec :: Int -> Sum a -> ShowS #

show :: Sum a -> String #

showList :: [Sum a] -> ShowS #

Show 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 (ForeignPtr a)

Since: base-2.1

Instance details

Defined in GHC.ForeignPtr

Show p => Show (Par1 p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> Par1 p -> ShowS #

show :: Par1 p -> String #

showList :: [Par1 p] -> ShowS #

Show (FunPtr a)

Since: base-2.1

Instance details

Defined in GHC.Ptr

Methods

showsPrec :: Int -> FunPtr a -> ShowS #

show :: FunPtr a -> String #

showList :: [FunPtr a] -> ShowS #

Show (Ptr a)

Since: base-2.1

Instance details

Defined in GHC.Ptr

Methods

showsPrec :: Int -> Ptr a -> ShowS #

show :: Ptr a -> String #

showList :: [Ptr a] -> ShowS #

Show a => Show (Ratio a)

Since: base-2.0.1

Instance details

Defined in GHC.Real

Methods

showsPrec :: Int -> Ratio a -> ShowS #

show :: Ratio a -> String #

showList :: [Ratio a] -> ShowS #

Show (Bits n) 
Instance details

Defined in Basement.Bits

Methods

showsPrec :: Int -> Bits n -> ShowS #

show :: Bits n -> String #

showList :: [Bits n] -> ShowS #

(PrimType ty, Show ty) => Show (Block ty) 
Instance details

Defined in Basement.Block.Base

Methods

showsPrec :: Int -> Block ty -> ShowS #

show :: Block ty -> String #

showList :: [Block ty] -> ShowS #

Show (Zn n) 
Instance details

Defined in Basement.Bounded

Methods

showsPrec :: Int -> Zn n -> ShowS #

show :: Zn n -> String #

showList :: [Zn n] -> ShowS #

Show (Zn64 n) 
Instance details

Defined in Basement.Bounded

Methods

showsPrec :: Int -> Zn64 n -> ShowS #

show :: Zn64 n -> String #

showList :: [Zn64 n] -> ShowS #

Show a => Show (NonEmpty a) 
Instance details

Defined in Basement.NonEmpty

Methods

showsPrec :: Int -> NonEmpty a -> ShowS #

show :: NonEmpty a -> String #

showList :: [NonEmpty a] -> ShowS #

Show (CountOf ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

showsPrec :: Int -> CountOf ty -> ShowS #

show :: CountOf ty -> String #

showList :: [CountOf ty] -> ShowS #

Show (Offset ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

showsPrec :: Int -> Offset ty -> ShowS #

show :: Offset ty -> String #

showList :: [Offset ty] -> ShowS #

(PrimType ty, Show ty) => Show (UArray ty) 
Instance details

Defined in Basement.UArray.Base

Methods

showsPrec :: Int -> UArray ty -> ShowS #

show :: UArray ty -> String #

showList :: [UArray ty] -> ShowS #

Show a => Show (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 (OnChainAddress mrel) Source # 
Instance details

Defined in BtcLsp.Data.Smart

Show (Liquidity dir) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

showsPrec :: Int -> Liquidity dir -> ShowS #

show :: Liquidity dir -> String #

showList :: [Liquidity dir] -> ShowS #

Show (LnInvoice mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

showsPrec :: Int -> LnInvoice mrel -> ShowS #

show :: LnInvoice mrel -> String #

showList :: [LnInvoice mrel] -> ShowS #

Show (UnsafeOnChainAddress mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Show (Uuid tab) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

showsPrec :: Int -> Uuid tab -> ShowS #

show :: Uuid tab -> String #

showList :: [Uuid tab] -> ShowS #

Show (TlsCert rel) Source # 
Instance details

Defined in BtcLsp.Grpc.Data

Methods

showsPrec :: Int -> TlsCert rel -> ShowS #

show :: TlsCert rel -> String #

showList :: [TlsCert rel] -> 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 (Identifier a) 
Instance details

Defined in Text.Casing

Show a => Show (MeridiemLocale a) 
Instance details

Defined in Chronos

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 (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

showsPrec :: Int -> IntMap a -> ShowS #

show :: IntMap a -> String #

showList :: [IntMap a] -> ShowS #

Show a => Show (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

showsPrec :: Int -> Seq a -> ShowS #

show :: Seq a -> String #

showList :: [Seq a] -> ShowS #

Show a => Show (ViewL a) 
Instance details

Defined in Data.Sequence.Internal

Methods

showsPrec :: Int -> ViewL a -> ShowS #

show :: ViewL a -> String #

showList :: [ViewL a] -> ShowS #

Show a => Show (ViewR a) 
Instance details

Defined in Data.Sequence.Internal

Methods

showsPrec :: Int -> ViewR a -> ShowS #

show :: ViewR a -> String #

showList :: [ViewR a] -> ShowS #

Show a => Show (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

showsPrec :: Int -> Set a -> ShowS #

show :: Set a -> String #

showList :: [Set a] -> ShowS #

Show a => Show (Tree a) 
Instance details

Defined in Data.Tree

Methods

showsPrec :: Int -> Tree a -> ShowS #

show :: Tree a -> String #

showList :: [Tree a] -> ShowS #

Show a => Show (CryptoFailable a) 
Instance details

Defined in Crypto.Error.Types

Show (Blake2b bitlen) 
Instance details

Defined in Crypto.Hash.Blake2

Methods

showsPrec :: Int -> Blake2b bitlen -> ShowS #

show :: Blake2b bitlen -> String #

showList :: [Blake2b bitlen] -> ShowS #

Show (Blake2bp bitlen) 
Instance details

Defined in Crypto.Hash.Blake2

Methods

showsPrec :: Int -> Blake2bp bitlen -> ShowS #

show :: Blake2bp bitlen -> String #

showList :: [Blake2bp bitlen] -> ShowS #

Show (Blake2s bitlen) 
Instance details

Defined in Crypto.Hash.Blake2

Methods

showsPrec :: Int -> Blake2s bitlen -> ShowS #

show :: Blake2s bitlen -> String #

showList :: [Blake2s bitlen] -> ShowS #

Show (Blake2sp bitlen) 
Instance details

Defined in Crypto.Hash.Blake2

Methods

showsPrec :: Int -> Blake2sp bitlen -> ShowS #

show :: Blake2sp bitlen -> String #

showList :: [Blake2sp bitlen] -> ShowS #

Show (SHAKE128 bitlen) 
Instance details

Defined in Crypto.Hash.SHAKE

Methods

showsPrec :: Int -> SHAKE128 bitlen -> ShowS #

show :: SHAKE128 bitlen -> String #

showList :: [SHAKE128 bitlen] -> ShowS #

Show (SHAKE256 bitlen) 
Instance details

Defined in Crypto.Hash.SHAKE

Methods

showsPrec :: Int -> SHAKE256 bitlen -> ShowS #

show :: SHAKE256 bitlen -> String #

showList :: [SHAKE256 bitlen] -> ShowS #

Show (Digest a) 
Instance details

Defined in Crypto.Hash.Types

Methods

showsPrec :: Int -> Digest a -> ShowS #

show :: Digest a -> String #

showList :: [Digest a] -> ShowS #

Show1 f => Show (Fix f) 
Instance details

Defined in Data.Fix

Methods

showsPrec :: Int -> Fix f -> ShowS #

show :: Fix f -> String #

showList :: [Fix f] -> ShowS #

(Functor f, Show1 f) => Show (Mu f) 
Instance details

Defined in Data.Fix

Methods

showsPrec :: Int -> Mu f -> ShowS #

show :: Mu f -> String #

showList :: [Mu f] -> ShowS #

(Functor f, Show1 f) => Show (Nu f) 
Instance details

Defined in Data.Fix

Methods

showsPrec :: Int -> Nu f -> ShowS #

show :: Nu f -> String #

showList :: [Nu f] -> ShowS #

Show a => Show (DNonEmpty a) 
Instance details

Defined in Data.DList.DNonEmpty.Internal

Show a => Show (DList a) 
Instance details

Defined in Data.DList.Internal

Methods

showsPrec :: Int -> DList a -> ShowS #

show :: DList a -> String #

showList :: [DList a] -> ShowS #

Show a => Show (Value a) 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Methods

showsPrec :: Int -> Value a -> ShowS #

show :: Value a -> String #

showList :: [Value a] -> ShowS #

Show a => Show (ValueList a) 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Show a => Show (ExitCase a) 
Instance details

Defined in Control.Monad.Catch

Methods

showsPrec :: Int -> ExitCase a -> ShowS #

show :: ExitCase a -> String #

showList :: [ExitCase a] -> ShowS #

Show a => Show (RB a) 
Instance details

Defined in Data.List.Extra

Methods

showsPrec :: Int -> RB a -> ShowS #

show :: RB a -> String #

showList :: [RB a] -> ShowS #

Show a => Show (FromListCounting a) 
Instance details

Defined in Data.Graph.Inductive.PatriciaTree

Methods

showsPrec :: Int -> FromListCounting a -> ShowS #

show :: FromListCounting a -> String #

showList :: [FromListCounting 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 a => Show (LenientData a) 
Instance details

Defined in Web.Internal.HttpApiData

Show body => Show (HistoriedResponse body) 
Instance details

Defined in Network.HTTP.Client

Show body => Show (Response body) 
Instance details

Defined in Network.HTTP.Client.Types

Methods

showsPrec :: Int -> Response body -> ShowS #

show :: Response body -> String #

showList :: [Response body] -> ShowS #

Show a => Show (AddrRange a) 
Instance details

Defined in Data.IP.Range

Show 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 (PendingUpdate a) 
Instance details

Defined in LndClient.Data.Channel

Methods

showsPrec :: Int -> PendingUpdate a -> ShowS #

show :: PendingUpdate a -> String #

showList :: [PendingUpdate a] -> ShowS #

Show (TxId a) 
Instance details

Defined in LndClient.Data.Newtype

Methods

showsPrec :: Int -> TxId a -> ShowS #

show :: TxId a -> String #

showList :: [TxId a] -> ShowS #

Show (Vout a) 
Instance details

Defined in LndClient.Data.Newtype

Methods

showsPrec :: Int -> Vout a -> ShowS #

show :: Vout a -> String #

showList :: [Vout a] -> ShowS #

Show mono => Show (NonNull mono) 
Instance details

Defined in Data.NonNull

Methods

showsPrec :: Int -> NonNull mono -> ShowS #

show :: NonNull mono -> String #

showList :: [NonNull mono] -> ShowS #

Show a => Show (BitcoinRpcResponse a) 
Instance details

Defined in Network.Bitcoin.Internal

Methods

showsPrec :: Int -> BitcoinRpcResponse a -> ShowS #

show :: BitcoinRpcResponse a -> String #

showList :: [BitcoinRpcResponse 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 (Key Block) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Show (Key LnChan) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Show (Key SwapIntoLn) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Show (Key SwapUtxo) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Show (Key User) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Methods

showsPrec :: Int -> Key User -> ShowS #

show :: Key User -> String #

showList :: [Key User] -> ShowS #

(BackendCompatible b s, Show (BackendKey b)) => Show (BackendKey (Compatible b s)) 
Instance details

Defined in Database.Persist.Compatible.Types

(PersistCore b, PersistCore (RawPostgresql b), Show (BackendKey b)) => Show (BackendKey (RawPostgresql b)) 
Instance details

Defined in Database.Persist.Postgresql

Show a => Show (ParseState a) 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

showsPrec :: Int -> ParseState a -> ShowS #

show :: ParseState a -> String #

showList :: [ParseState a] -> ShowS #

Show a => Show (Single a) 
Instance details

Defined in Database.Persist.Sql.Types

Methods

showsPrec :: Int -> Single a -> ShowS #

show :: Single a -> String #

showList :: [Single a] -> ShowS #

Show a => Show (AnnotDetails a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Show (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

showsPrec :: Int -> Doc a -> ShowS #

show :: Doc a -> String #

showList :: [Doc a] -> ShowS #

Show a => Show (Span a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

showsPrec :: Int -> Span a -> ShowS #

show :: Span a -> String #

showList :: [Span a] -> ShowS #

Show a => Show (CommaSeparated a) 
Instance details

Defined in Text.Pretty.Simple.Internal.Expr

Show a => Show (Stream a) 
Instance details

Defined in Text.Pretty.Simple.Internal.Printer

Methods

showsPrec :: Int -> Stream a -> ShowS #

show :: Stream a -> String #

showList :: [Stream a] -> ShowS #

Show a => Show (Tape a) 
Instance details

Defined in Text.Pretty.Simple.Internal.Printer

Methods

showsPrec :: Int -> Tape a -> ShowS #

show :: Tape a -> String #

showList :: [Tape a] -> ShowS #

Show (Doc ann)

(show doc) prettyprints document doc with defaultLayoutOptions, ignoring all annotations.

Instance details

Defined in Prettyprinter.Internal

Methods

showsPrec :: Int -> Doc ann -> ShowS #

show :: Doc ann -> String #

showList :: [Doc ann] -> ShowS #

Show ann => Show (SimpleDocStream ann) 
Instance details

Defined in Prettyprinter.Internal

Show a => Show (Array a) 
Instance details

Defined in Data.Primitive.Array

Methods

showsPrec :: Int -> Array a -> ShowS #

show :: Array a -> String #

showList :: [Array a] -> ShowS #

(Show a, Prim a) => Show (PrimArray a)

Since: primitive-0.6.4.0

Instance details

Defined in Data.Primitive.PrimArray

Show a => Show (SmallArray a) 
Instance details

Defined in Data.Primitive.SmallArray

(Show a, PrimUnlifted a) => Show (UnliftedArray a) 
Instance details

Defined in Data.Primitive.Unlifted.Array

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 g => Show (StateGen g) 
Instance details

Defined in System.Random.Internal

Methods

showsPrec :: Int -> StateGen g -> ShowS #

show :: StateGen g -> String #

showList :: [StateGen g] -> ShowS #

Show g => Show (AtomicGen g) 
Instance details

Defined in System.Random.Stateful

Show g => Show (IOGen g) 
Instance details

Defined in System.Random.Stateful

Methods

showsPrec :: Int -> IOGen g -> ShowS #

show :: IOGen g -> String #

showList :: [IOGen g] -> ShowS #

Show g => Show (STGen g) 
Instance details

Defined in System.Random.Stateful

Methods

showsPrec :: Int -> STGen g -> ShowS #

show :: STGen g -> String #

showList :: [STGen g] -> ShowS #

Show g => Show (TGen g) 
Instance details

Defined in System.Random.Stateful

Methods

showsPrec :: Int -> TGen g -> ShowS #

show :: TGen g -> String #

showList :: [TGen g] -> ShowS #

Show (Pool a) 
Instance details

Defined in Data.Pool

Methods

showsPrec :: Int -> Pool a -> ShowS #

show :: Pool a -> String #

showList :: [Pool a] -> ShowS #

Show v => Show (Result v) 
Instance details

Defined in Text.Hamlet.Parse

Methods

showsPrec :: Int -> Result v -> ShowS #

show :: Result v -> String #

showList :: [Result v] -> ShowS #

Show a => Show (Maybe a) 
Instance details

Defined in Data.Strict.Maybe

Methods

showsPrec :: Int -> Maybe a -> ShowS #

show :: Maybe a -> String #

showList :: [Maybe a] -> ShowS #

Show flag => Show (TyVarBndr flag) 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> TyVarBndr flag -> ShowS #

show :: TyVarBndr flag -> String #

showList :: [TyVarBndr flag] -> ShowS #

Show (Memoized a) 
Instance details

Defined in UnliftIO.Memoize

Methods

showsPrec :: Int -> Memoized a -> ShowS #

show :: Memoized a -> String #

showList :: [Memoized a] -> ShowS #

Show a => Show (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Methods

showsPrec :: Int -> HashSet a -> ShowS #

show :: HashSet a -> String #

showList :: [HashSet a] -> ShowS #

Show a => Show (Vector a) 
Instance details

Defined in Data.Vector

Methods

showsPrec :: Int -> Vector a -> ShowS #

show :: Vector a -> String #

showList :: [Vector a] -> ShowS #

(Show a, Prim a) => Show (Vector a) 
Instance details

Defined in Data.Vector.Primitive

Methods

showsPrec :: Int -> Vector a -> ShowS #

show :: Vector a -> String #

showList :: [Vector a] -> ShowS #

(Show a, Storable a) => Show (Vector a) 
Instance details

Defined in Data.Vector.Storable

Methods

showsPrec :: Int -> Vector a -> ShowS #

show :: Vector a -> String #

showList :: [Vector a] -> ShowS #

Show c => Show (FileInfo c) 
Instance details

Defined in Network.Wai.Parse

Methods

showsPrec :: Int -> FileInfo c -> ShowS #

show :: FileInfo c -> String #

showList :: [FileInfo c] -> ShowS #

Show (Creds master) 
Instance details

Defined in Yesod.Auth

Methods

showsPrec :: Int -> Creds master -> ShowS #

show :: Creds master -> String #

showList :: [Creds master] -> ShowS #

Show url => Show (Location url) 
Instance details

Defined in Yesod.Core.Types

Methods

showsPrec :: Int -> Location url -> ShowS #

show :: Location url -> String #

showList :: [Location url] -> ShowS #

Show url => Show (Script url) 
Instance details

Defined in Yesod.Core.Types

Methods

showsPrec :: Int -> Script url -> ShowS #

show :: Script url -> String #

showList :: [Script url] -> ShowS #

Show url => Show (Stylesheet url) 
Instance details

Defined in Yesod.Core.Types

Methods

showsPrec :: Int -> Stylesheet url -> ShowS #

show :: Stylesheet url -> String #

showList :: [Stylesheet url] -> ShowS #

Show (Route App) Source # 
Instance details

Defined in BtcLsp.Yesod.Foundation

Show (Route Auth) 
Instance details

Defined in Yesod.Auth.Routes

Show (Route LiteApp) 
Instance details

Defined in Yesod.Core.Internal.LiteApp

Show (Route WaiSubsite) 
Instance details

Defined in Yesod.Core.Types

Show (Route WaiSubsiteWithAuth) 
Instance details

Defined in Yesod.Core.Types

Show (Route Static) 
Instance details

Defined in Yesod.Static

Show typ => Show (Dispatch typ) 
Instance details

Defined in Yesod.Routes.TH.Types

Methods

showsPrec :: Int -> Dispatch typ -> ShowS #

show :: Dispatch typ -> String #

showList :: [Dispatch typ] -> ShowS #

Show a => Show (FlatResource a) 
Instance details

Defined in Yesod.Routes.TH.Types

Show typ => Show (Piece typ) 
Instance details

Defined in Yesod.Routes.TH.Types

Methods

showsPrec :: Int -> Piece typ -> ShowS #

show :: Piece typ -> String #

showList :: [Piece typ] -> ShowS #

Show typ => Show (Resource typ) 
Instance details

Defined in Yesod.Routes.TH.Types

Methods

showsPrec :: Int -> Resource typ -> ShowS #

show :: Resource typ -> String #

showList :: [Resource typ] -> ShowS #

Show typ => Show (ResourceTree typ) 
Instance details

Defined in Yesod.Routes.TH.Types

Show msg => Show (BootstrapSubmit msg) 
Instance details

Defined in Yesod.Form.Bootstrap3

Show a => Show (FormResult a) 
Instance details

Defined in Yesod.Form.Types

Show a => Show (Maybe a)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Maybe a -> ShowS #

show :: Maybe a -> String #

showList :: [Maybe a] -> ShowS #

Show a => Show (a)

Since: base-4.15

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a) -> ShowS #

show :: (a) -> String #

showList :: [(a)] -> ShowS #

Show a => Show [a]

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> [a] -> ShowS #

show :: [a] -> String #

showList :: [[a]] -> ShowS #

(Show i, Show r) => Show (IResult i r) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

showsPrec :: Int -> IResult i r -> ShowS #

show :: IResult i r -> String #

showList :: [IResult i r] -> ShowS #

(Show a, Show b) => Show (Either a b)

Since: base-3.0

Instance details

Defined in Data.Either

Methods

showsPrec :: Int -> Either a b -> ShowS #

show :: Either a b -> String #

showList :: [Either a b] -> ShowS #

HasResolution a => Show (Fixed a)

Since: base-2.1

Instance details

Defined in Data.Fixed

Methods

showsPrec :: Int -> Fixed a -> ShowS #

show :: Fixed a -> String #

showList :: [Fixed a] -> ShowS #

Show (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

showsPrec :: Int -> Proxy s -> ShowS #

show :: Proxy s -> String #

showList :: [Proxy s] -> ShowS #

(Show a, Show b) => Show (Arg a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

showsPrec :: Int -> Arg a b -> ShowS #

show :: Arg a b -> String #

showList :: [Arg a b] -> ShowS #

Show (TypeRep a) 
Instance details

Defined in Data.Typeable.Internal

Methods

showsPrec :: Int -> TypeRep a -> ShowS #

show :: TypeRep a -> String #

showList :: [TypeRep a] -> ShowS #

Show (U1 p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> U1 p -> ShowS #

show :: U1 p -> String #

showList :: [U1 p] -> ShowS #

Show (V1 p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> V1 p -> ShowS #

show :: V1 p -> String #

showList :: [V1 p] -> ShowS #

Show (ST s a)

Since: base-2.1

Instance details

Defined in GHC.ST

Methods

showsPrec :: Int -> ST s a -> ShowS #

show :: ST s a -> String #

showList :: [ST s a] -> ShowS #

(Show k, Show a) => Show (Map k a) 
Instance details

Defined in Data.Map.Internal

Methods

showsPrec :: Int -> Map k a -> ShowS #

show :: Map k a -> String #

showList :: [Map k a] -> ShowS #

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 a, Show b) => Show (Gr a b) 
Instance details

Defined in Data.Graph.Inductive.PatriciaTree

Methods

showsPrec :: Int -> Gr a b -> ShowS #

show :: Gr a b -> String #

showList :: [Gr a b] -> ShowS #

(Show1 f, Show a) => Show (Cofree f a) 
Instance details

Defined in Control.Comonad.Cofree

Methods

showsPrec :: Int -> Cofree f a -> ShowS #

show :: Cofree f a -> String #

showList :: [Cofree f a] -> ShowS #

(Show1 f, Show a) => Show (Free f a) 
Instance details

Defined in Control.Monad.Free

Methods

showsPrec :: Int -> Free f a -> ShowS #

show :: Free f a -> String #

showList :: [Free f a] -> ShowS #

Show (VarExp msg url) 
Instance details

Defined in Text.Hamlet

Methods

showsPrec :: Int -> VarExp msg url -> ShowS #

show :: VarExp msg url -> String #

showList :: [VarExp msg url] -> ShowS #

(Show a, Show b) => Show (Either a b) 
Instance details

Defined in Data.Strict.Either

Methods

showsPrec :: Int -> Either a b -> ShowS #

show :: Either a b -> String #

showList :: [Either a b] -> ShowS #

(Show a, Show b) => Show (These a b) 
Instance details

Defined in Data.Strict.These

Methods

showsPrec :: Int -> These a b -> ShowS #

show :: These a b -> String #

showList :: [These a b] -> ShowS #

(Show a, Show b) => Show (Pair a b) 
Instance details

Defined in Data.Strict.Tuple

Methods

showsPrec :: Int -> Pair a b -> ShowS #

show :: Pair a b -> String #

showList :: [Pair a b] -> ShowS #

(Show a, Show b) => Show (These a b) 
Instance details

Defined in Data.These

Methods

showsPrec :: Int -> These a b -> ShowS #

show :: These a b -> String #

showList :: [These a b] -> ShowS #

(Show1 f, Show a) => Show (Lift f a) 
Instance details

Defined in Control.Applicative.Lift

Methods

showsPrec :: Int -> Lift f a -> ShowS #

show :: Lift f a -> String #

showList :: [Lift f a] -> ShowS #

(Show1 m, Show a) => Show (ListT m a) 
Instance details

Defined in Control.Monad.Trans.List

Methods

showsPrec :: Int -> ListT m a -> ShowS #

show :: ListT m a -> String #

showList :: [ListT m a] -> ShowS #

(Show1 m, Show a) => Show (MaybeT m a) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

showsPrec :: Int -> MaybeT m a -> ShowS #

show :: MaybeT m a -> String #

showList :: [MaybeT m a] -> ShowS #

(Show k, Show v) => Show (HashMap k v) 
Instance details

Defined in Data.HashMap.Internal

Methods

showsPrec :: Int -> HashMap k v -> ShowS #

show :: HashMap k v -> String #

showList :: [HashMap k v] -> ShowS #

(Show source, Typeable source, Typeable target) => Show (TryFromException source target) 
Instance details

Defined in Witch.TryFromException

Methods

showsPrec :: Int -> TryFromException source target -> ShowS #

show :: TryFromException source target -> String #

showList :: [TryFromException source target] -> ShowS #

(Show a, Show b) => Show (Fragment a b) 
Instance details

Defined in Yesod.Core.Handler

Methods

showsPrec :: Int -> Fragment a b -> ShowS #

show :: Fragment a b -> String #

showList :: [Fragment a b] -> ShowS #

(Show a, Show b) => Show (a, b)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a, b) -> ShowS #

show :: (a, b) -> String #

showList :: [(a, b)] -> ShowS #

Show a => Show (Const a b)

This instance would be equivalent to the derived instances of the Const newtype if the getConst field were removed

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Const

Methods

showsPrec :: Int -> Const a b -> ShowS #

show :: Const a b -> String #

showList :: [Const a b] -> ShowS #

Show (f a) => Show (Ap f a)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

showsPrec :: Int -> Ap f a -> ShowS #

show :: Ap f a -> String #

showList :: [Ap f a] -> ShowS #

Show (f a) => Show (Alt f a)

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

showsPrec :: Int -> Alt f a -> ShowS #

show :: Alt f a -> String #

showList :: [Alt f a] -> ShowS #

Show (a :~: b)

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Equality

Methods

showsPrec :: Int -> (a :~: b) -> ShowS #

show :: (a :~: b) -> String #

showList :: [a :~: b] -> ShowS #

Show (f p) => Show (Rec1 f p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> Rec1 f p -> ShowS #

show :: Rec1 f p -> String #

showList :: [Rec1 f p] -> ShowS #

Show (URec Char p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> URec Char p -> ShowS #

show :: URec Char p -> String #

showList :: [URec Char p] -> ShowS #

Show (URec Double p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> URec Double p -> ShowS #

show :: URec Double p -> String #

showList :: [URec Double p] -> ShowS #

Show (URec Float p) 
Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> URec Float p -> ShowS #

show :: URec Float p -> String #

showList :: [URec Float p] -> ShowS #

Show (URec Int p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> URec Int p -> ShowS #

show :: URec Int p -> String #

showList :: [URec Int p] -> ShowS #

Show (URec Word p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> URec Word p -> ShowS #

show :: URec Word p -> String #

showList :: [URec Word p] -> ShowS #

Show (p a a) => Show (Join p a) 
Instance details

Defined in Data.Bifunctor.Join

Methods

showsPrec :: Int -> Join p a -> ShowS #

show :: Join p a -> String #

showList :: [Join p a] -> ShowS #

Show (Money owner btcl mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

showsPrec :: Int -> Money owner btcl mrel -> ShowS #

show :: Money owner btcl mrel -> String #

showList :: [Money owner btcl mrel] -> ShowS #

(Show a, Show (f b)) => Show (FreeF f a b) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

showsPrec :: Int -> FreeF f a b -> ShowS #

show :: FreeF f a b -> String #

showList :: [FreeF f a b] -> ShowS #

(Show1 f, Show1 m, Show a) => Show (FreeT f m a) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

showsPrec :: Int -> FreeT f m a -> ShowS #

show :: FreeT f m a -> String #

showList :: [FreeT f m a] -> ShowS #

Show b => Show (Tagged s b) 
Instance details

Defined in Data.Tagged

Methods

showsPrec :: Int -> Tagged s b -> ShowS #

show :: Tagged s b -> String #

showList :: [Tagged s b] -> ShowS #

(Show1 f, Show1 g, Show a) => Show (These1 f g a) 
Instance details

Defined in Data.Functor.These

Methods

showsPrec :: Int -> These1 f g a -> ShowS #

show :: These1 f g a -> String #

showList :: [These1 f g a] -> ShowS #

(Show1 f, Show a) => Show (Backwards f a) 
Instance details

Defined in Control.Applicative.Backwards

Methods

showsPrec :: Int -> Backwards f a -> ShowS #

show :: Backwards f a -> String #

showList :: [Backwards f a] -> ShowS #

(Show e, Show1 m, Show a) => Show (ErrorT e m a) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

showsPrec :: Int -> ErrorT e m a -> ShowS #

show :: ErrorT e m a -> String #

showList :: [ErrorT e m a] -> ShowS #

(Show e, Show1 m, Show a) => Show (ExceptT e m a) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

showsPrec :: Int -> ExceptT e m a -> ShowS #

show :: ExceptT e m a -> String #

showList :: [ExceptT e m a] -> ShowS #

(Show1 f, Show a) => Show (IdentityT f a) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

showsPrec :: Int -> IdentityT f a -> ShowS #

show :: IdentityT f a -> String #

showList :: [IdentityT f a] -> ShowS #

(Show w, Show1 m, Show a) => Show (WriterT w m a) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

showsPrec :: Int -> WriterT w m a -> ShowS #

show :: WriterT w m a -> String #

showList :: [WriterT w m a] -> ShowS #

(Show w, Show1 m, Show a) => Show (WriterT w m a) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

showsPrec :: Int -> WriterT w m a -> ShowS #

show :: WriterT w m a -> String #

showList :: [WriterT w m a] -> ShowS #

Show a => Show (Constant a b) 
Instance details

Defined in Data.Functor.Constant

Methods

showsPrec :: Int -> Constant a b -> ShowS #

show :: Constant a b -> String #

showList :: [Constant a b] -> ShowS #

(Show1 f, Show a) => Show (Reverse f a) 
Instance details

Defined in Data.Functor.Reverse

Methods

showsPrec :: Int -> Reverse f a -> ShowS #

show :: Reverse f a -> String #

showList :: [Reverse f a] -> ShowS #

(Show a, Show b, Show c) => Show (a, b, c)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a, b, c) -> ShowS #

show :: (a, b, c) -> String #

showList :: [(a, b, c)] -> ShowS #

(Show1 f, Show1 g, Show a) => Show (Product f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Product

Methods

showsPrec :: Int -> Product f g a -> ShowS #

show :: Product f g a -> String #

showList :: [Product f g a] -> ShowS #

(Show1 f, Show1 g, Show a) => Show (Sum f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Sum

Methods

showsPrec :: Int -> Sum f g a -> ShowS #

show :: Sum f g a -> String #

showList :: [Sum f g a] -> ShowS #

Show (a :~~: b)

Since: base-4.10.0.0

Instance details

Defined in Data.Type.Equality

Methods

showsPrec :: Int -> (a :~~: b) -> ShowS #

show :: (a :~~: b) -> String #

showList :: [a :~~: b] -> ShowS #

(Show (f p), Show (g p)) => Show ((f :*: g) p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> (f :*: g) p -> ShowS #

show :: (f :*: g) p -> String #

showList :: [(f :*: g) p] -> ShowS #

(Show (f p), Show (g p)) => Show ((f :+: g) p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> (f :+: g) p -> ShowS #

show :: (f :+: g) p -> String #

showList :: [(f :+: g) p] -> ShowS #

Show c => Show (K1 i c p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> K1 i c p -> ShowS #

show :: K1 i c p -> String #

showList :: [K1 i c p] -> ShowS #

(Show a, Show b, Show c, Show d) => Show (a, b, c, d)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a, b, c, d) -> ShowS #

show :: (a, b, c, d) -> String #

showList :: [(a, b, c, d)] -> ShowS #

(Show1 f, Show1 g, Show a) => Show (Compose f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

showsPrec :: Int -> Compose f g a -> ShowS #

show :: Compose f g a -> String #

showList :: [Compose f g a] -> ShowS #

Show (f (g p)) => Show ((f :.: g) p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> (f :.: g) p -> ShowS #

show :: (f :.: g) p -> String #

showList :: [(f :.: g) p] -> ShowS #

Show (f p) => Show (M1 i c f p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> M1 i c f p -> ShowS #

show :: M1 i c f p -> String #

showList :: [M1 i c f p] -> ShowS #

Show (f a) => Show (Clown f a b) 
Instance details

Defined in Data.Bifunctor.Clown

Methods

showsPrec :: Int -> Clown f a b -> ShowS #

show :: Clown f a b -> String #

showList :: [Clown f a b] -> ShowS #

Show (p b a) => Show (Flip p a b) 
Instance details

Defined in Data.Bifunctor.Flip

Methods

showsPrec :: Int -> Flip p a b -> ShowS #

show :: Flip p a b -> String #

showList :: [Flip p a b] -> ShowS #

Show (g b) => Show (Joker g a b) 
Instance details

Defined in Data.Bifunctor.Joker

Methods

showsPrec :: Int -> Joker g a b -> ShowS #

show :: Joker g a b -> String #

showList :: [Joker g a b] -> ShowS #

Show (p a b) => Show (WrappedBifunctor p a b) 
Instance details

Defined in Data.Bifunctor.Wrapped

(Show a, Show b, Show c, Show d, Show e) => Show (a, b, c, d, e)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a, b, c, d, e) -> ShowS #

show :: (a, b, c, d, e) -> String #

showList :: [(a, b, c, d, e)] -> ShowS #

(Show (f a b), Show (g a b)) => Show (Product f g a b) 
Instance details

Defined in Data.Bifunctor.Product

Methods

showsPrec :: Int -> Product f g a b -> ShowS #

show :: Product f g a b -> String #

showList :: [Product f g a b] -> ShowS #

(Show (p a b), Show (q a b)) => Show (Sum p q a b) 
Instance details

Defined in Data.Bifunctor.Sum

Methods

showsPrec :: Int -> Sum p q a b -> ShowS #

show :: Sum p q a b -> String #

showList :: [Sum p q a b] -> ShowS #

(Show a, Show b, Show c, Show d, Show e, Show f) => Show (a, b, c, d, e, f)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f) -> ShowS #

show :: (a, b, c, d, e, f) -> String #

showList :: [(a, b, c, d, e, f)] -> ShowS #

Show (f (p a b)) => Show (Tannen f p a b) 
Instance details

Defined in Data.Bifunctor.Tannen

Methods

showsPrec :: Int -> Tannen f p a b -> ShowS #

show :: Tannen f p a b -> String #

showList :: [Tannen f p a b] -> ShowS #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g) => Show (a, b, c, d, e, f, g)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g) -> ShowS #

show :: (a, b, c, d, e, f, g) -> String #

showList :: [(a, b, c, d, e, f, g)] -> ShowS #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h) => Show (a, b, c, d, e, f, g, h)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g, h) -> ShowS #

show :: (a, b, c, d, e, f, g, h) -> String #

showList :: [(a, b, c, d, e, f, g, h)] -> ShowS #

Show (p (f a) (g b)) => Show (Biff p f g a b) 
Instance details

Defined in Data.Bifunctor.Biff

Methods

showsPrec :: Int -> Biff p f g a b -> ShowS #

show :: Biff p f g a b -> String #

showList :: [Biff p f g a b] -> ShowS #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i) => Show (a, b, c, d, e, f, g, h, i)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g, h, i) -> ShowS #

show :: (a, b, c, d, e, f, g, h, i) -> String #

showList :: [(a, b, c, d, e, f, g, h, i)] -> ShowS #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j) => Show (a, b, c, d, e, f, g, h, i, j)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g, h, i, j) -> ShowS #

show :: (a, b, c, d, e, f, g, h, i, j) -> String #

showList :: [(a, b, c, d, e, f, g, h, i, j)] -> ShowS #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k) => Show (a, b, c, d, e, f, g, h, i, j, k)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g, h, i, j, k) -> ShowS #

show :: (a, b, c, d, e, f, g, h, i, j, k) -> String #

showList :: [(a, b, c, d, e, f, g, h, i, j, k)] -> ShowS #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k, Show l) => Show (a, b, c, d, e, f, g, h, i, j, k, l)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g, h, i, j, k, l) -> ShowS #

show :: (a, b, c, d, e, f, g, h, i, j, k, l) -> String #

showList :: [(a, b, c, d, e, f, g, h, i, j, k, l)] -> ShowS #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k, Show l, Show m) => Show (a, b, c, d, e, f, g, h, i, j, k, l, m)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> ShowS #

show :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> String #

showList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m)] -> ShowS #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k, Show l, Show m, Show n) => Show (a, b, c, d, e, f, g, h, i, j, k, l, m, n)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> ShowS #

show :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> String #

showList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m, n)] -> ShowS #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k, Show l, Show m, Show n, Show o) => Show (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> ShowS #

show :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> String #

showList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)] -> ShowS #

class Typeable (a :: k) #

The class Typeable allows a concrete representation of a type to be calculated.

Minimal complete definition

typeRep#

class Monad m => MonadFail (m :: Type -> Type) where #

When a value is bound in do-notation, the pattern on the left hand side of <- might not match. In this case, this class provides a function to recover.

A Monad without a MonadFail instance may only be used in conjunction with pattern that always match, such as newtypes, tuples, data types with only a single data constructor, and irrefutable patterns (~pat).

Instances of MonadFail should satisfy the following law: fail s should be a left zero for >>=,

fail s >>= f  =  fail s

If your Monad is also MonadPlus, a popular definition is

fail _ = mzero

Since: base-4.9.0.0

Methods

fail :: String -> m a #

Instances

Instances details
MonadFail IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fail :: String -> IResult a #

MonadFail Parser 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fail :: String -> Parser a #

MonadFail Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fail :: String -> Result a #

MonadFail P

Since: base-4.9.0.0

Instance details

Defined in Text.ParserCombinators.ReadP

Methods

fail :: String -> P a #

MonadFail ReadP

Since: base-4.9.0.0

Instance details

Defined in Text.ParserCombinators.ReadP

Methods

fail :: String -> ReadP a #

MonadFail ReadPrec

Since: base-4.9.0.0

Instance details

Defined in Text.ParserCombinators.ReadPrec

Methods

fail :: String -> ReadPrec a #

MonadFail Get 
Instance details

Defined in Data.Binary.Get.Internal

Methods

fail :: String -> Get a #

MonadFail DList 
Instance details

Defined in Data.DList.Internal

Methods

fail :: String -> DList a #

MonadFail IO

Since: base-4.9.0.0

Instance details

Defined in Control.Monad.Fail

Methods

fail :: String -> IO a #

MonadFail Array 
Instance details

Defined in Data.Primitive.Array

Methods

fail :: String -> Array a #

MonadFail SmallArray 
Instance details

Defined in Data.Primitive.SmallArray

Methods

fail :: String -> SmallArray a #

MonadFail 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 Result 
Instance details

Defined in Text.Hamlet.Parse

Methods

fail :: String -> Result a #

MonadFail Q 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

fail :: String -> Q a #

MonadFail Vector

Since: vector-0.12.1.0

Instance details

Defined in Data.Vector

Methods

fail :: String -> Vector a #

MonadFail Stream 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

fail :: String -> Stream a #

MonadFail Maybe

Since: base-4.9.0.0

Instance details

Defined in Control.Monad.Fail

Methods

fail :: String -> Maybe a #

MonadFail []

Since: base-4.9.0.0

Instance details

Defined in Control.Monad.Fail

Methods

fail :: String -> [a] #

MonadFail (Parser i) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

fail :: String -> Parser i a #

MonadFail (ST s)

Since: base-4.10

Instance details

Defined in Control.Monad.ST.Lazy.Imp

Methods

fail :: String -> ST s 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 (CatchT m) 
Instance details

Defined in Control.Monad.Catch.Pure

Methods

fail :: String -> CatchT 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 m => MonadFail (LoggingT m)

Since: monad-logger-0.3.30

Instance details

Defined in Control.Monad.Logger

Methods

fail :: String -> LoggingT m a #

MonadFail m => MonadFail (NoLoggingT m)

Since: monad-logger-0.3.30

Instance details

Defined in Control.Monad.Logger

Methods

fail :: String -> NoLoggingT m a #

MonadFail m => MonadFail (ResourceT m)

Since: resourcet-1.2.2

Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

fail :: String -> ResourceT m a #

Monad m => MonadFail (ListT m) 
Instance details

Defined in Control.Monad.Trans.List

Methods

fail :: String -> ListT m a #

Monad m => MonadFail (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

fail :: String -> MaybeT m a #

MonadFail f => MonadFail (Ap f)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

fail :: String -> Ap f a #

(Functor f, MonadFail m) => MonadFail (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

fail :: String -> FreeT f m a #

MonadFail m => MonadFail (StateT s m) 
Instance details

Defined in Lens.Micro

Methods

fail :: String -> StateT s m a #

(Monoid w, MonadFail m) => MonadFail (AccumT w m) 
Instance details

Defined in Control.Monad.Trans.Accum

Methods

fail :: String -> AccumT w m a #

(Monad m, Error e) => MonadFail (ErrorT e m) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

fail :: String -> ErrorT e m a #

MonadFail m => MonadFail (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

fail :: String -> ExceptT e m a #

MonadFail m => MonadFail (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

fail :: String -> IdentityT m a #

MonadFail m => MonadFail (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

fail :: String -> ReaderT r m a #

MonadFail m => MonadFail (SelectT r m) 
Instance details

Defined in Control.Monad.Trans.Select

Methods

fail :: String -> SelectT r m a #

MonadFail m => MonadFail (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Lazy

Methods

fail :: String -> StateT s m a #

MonadFail m => MonadFail (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

fail :: String -> StateT s m a #

MonadFail m => MonadFail (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.CPS

Methods

fail :: String -> WriterT w m a #

(Monoid w, MonadFail m) => MonadFail (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

fail :: String -> WriterT w m a #

(Monoid w, MonadFail m) => MonadFail (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

fail :: String -> WriterT w m a #

MonadFail m => MonadFail (Reverse m) 
Instance details

Defined in Data.Functor.Reverse

Methods

fail :: String -> Reverse m a #

MonadFail m => MonadFail (ConduitT i o m)

Since: conduit-1.3.1

Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

fail :: String -> ConduitT i o m a #

MonadFail m => MonadFail (ContT r m) 
Instance details

Defined in Control.Monad.Trans.Cont

Methods

fail :: String -> ContT r m a #

MonadFail m => MonadFail (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.CPS

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.Lazy

Methods

fail :: String -> RWST r w s m a #

(Monoid w, MonadFail m) => MonadFail (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.Strict

Methods

fail :: String -> RWST r w s m a #

class IsString a where #

Class for string-like datastructures; used by the overloaded string extension (-XOverloadedStrings in GHC).

Methods

fromString :: String -> a #

Instances

Instances details
IsString Value 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fromString :: String -> Value #

IsString String 
Instance details

Defined in Basement.UTF8.Base

Methods

fromString :: String0 -> String #

IsString AttributeValue 
Instance details

Defined in Text.Blaze.Internal

IsString ChoiceString 
Instance details

Defined in Text.Blaze.Internal

IsString StaticString 
Instance details

Defined in Text.Blaze.Internal

IsString Tag 
Instance details

Defined in Text.Blaze.Internal

Methods

fromString :: String -> Tag #

IsString NodePubKeyHex Source # 
Instance details

Defined in BtcLsp.Data.Type

IsString NodeUriHex Source # 
Instance details

Defined in BtcLsp.Data.Type

IsString SigHeaderName Source # 
Instance details

Defined in BtcLsp.Grpc.Data

IsString ByteString

Beware: fromString truncates multi-byte characters to octets. e.g. "枯朶に烏のとまりけり秋の暮" becomes �6k�nh~�Q��n�

Instance details

Defined in Data.ByteString.Internal

IsString ByteString

Beware: fromString truncates multi-byte characters to octets. e.g. "枯朶に烏のとまりけり秋の暮" becomes �6k�nh~�Q��n�

Instance details

Defined in Data.ByteString.Lazy.Internal

IsString ShortByteString

Beware: fromString truncates multi-byte characters to octets. e.g. "枯朶に烏のとまりけり秋の暮" becomes �6k�nh~�Q��n�

Instance details

Defined in Data.ByteString.Short.Internal

IsString LogStr 
Instance details

Defined in System.Log.FastLogger.LogStr

Methods

fromString :: String -> LogStr #

IsString RequestBody

Since 0.4.12

Instance details

Defined in Network.HTTP.Client.Types

IsString IP 
Instance details

Defined in Data.IP.Addr

Methods

fromString :: String -> IP #

IsString IPv4 
Instance details

Defined in Data.IP.Addr

Methods

fromString :: String -> IPv4 #

IsString IPv6 
Instance details

Defined in Data.IP.Addr

Methods

fromString :: String -> IPv6 #

IsString IPRange 
Instance details

Defined in Data.IP.Range

Methods

fromString :: String -> IPRange #

IsString Environment 
Instance details

Defined in Katip.Core

IsString LogStr 
Instance details

Defined in Katip.Core

Methods

fromString :: String -> LogStr #

IsString Namespace 
Instance details

Defined in Katip.Core

IsString LndHexMacaroon 
Instance details

Defined in LndClient.Data.LndEnv

Methods

fromString :: String -> LndHexMacaroon #

IsString LndHost' 
Instance details

Defined in LndClient.Data.LndEnv

Methods

fromString :: String -> LndHost' #

IsString LndWalletPassword 
Instance details

Defined in LndClient.Data.LndEnv

Methods

fromString :: String -> LndWalletPassword #

IsString Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Methods

fromString :: String -> Doc #

IsString Msg 
Instance details

Defined in Crypto.Secp256k1

Methods

fromString :: String -> Msg #

IsString PubKey 
Instance details

Defined in Crypto.Secp256k1

Methods

fromString :: String -> PubKey #

IsString SecKey 
Instance details

Defined in Crypto.Secp256k1

Methods

fromString :: String -> SecKey #

IsString Sig 
Instance details

Defined in Crypto.Secp256k1

Methods

fromString :: String -> Sig #

IsString Tweak 
Instance details

Defined in Crypto.Secp256k1

Methods

fromString :: String -> Tweak #

IsString HostPreference 
Instance details

Defined in Data.Streaming.Network.Internal

IsString Builder 
Instance details

Defined in Data.Text.Internal.Builder

Methods

fromString :: String -> Builder #

IsString ShortText

Note: Surrogate pairs ([U+D800 .. U+DFFF]) in string literals are replaced by U+FFFD.

This matches the behaviour of IsString instance for Text.

Instance details

Defined in Data.Text.Short.Internal

IsString Content 
Instance details

Defined in Data.XML.Types

Methods

fromString :: String -> Content #

IsString Name 
Instance details

Defined in Data.XML.Types

Methods

fromString :: String -> Name #

IsString Node 
Instance details

Defined in Data.XML.Types

Methods

fromString :: String -> Node #

IsString Content 
Instance details

Defined in Yesod.Core.Types

Methods

fromString :: String -> Content #

IsString Textarea 
Instance details

Defined in Yesod.Form.Fields

IsString a => IsString (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.String

Methods

fromString :: String -> Identity a #

a ~ () => IsString (MarkupM a) 
Instance details

Defined in Text.Blaze.Internal

Methods

fromString :: String -> MarkupM a #

(IsString s, FoldCase s) => IsString (CI s) 
Instance details

Defined in Data.CaseInsensitive.Internal

Methods

fromString :: String -> CI s #

a ~ Char => IsString (Seq a)

Since: containers-0.5.7

Instance details

Defined in Data.Sequence.Internal

Methods

fromString :: String -> Seq a #

a ~ Char => IsString (DNonEmpty a) 
Instance details

Defined in Data.DList.DNonEmpty.Internal

Methods

fromString :: String -> DNonEmpty a #

a ~ Char => IsString (DList a) 
Instance details

Defined in Data.DList.Internal

Methods

fromString :: String -> DList a #

(IsString a, Hashable a) => IsString (Hashed a) 
Instance details

Defined in Data.Hashable.Class

Methods

fromString :: String -> Hashed a #

IsString (AddrRange IPv4) 
Instance details

Defined in Data.IP.Range

IsString (AddrRange IPv6) 
Instance details

Defined in Data.IP.Range

IsString (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

fromString :: String -> Doc a #

IsString (Doc ann)
>>> pretty ("hello\nworld")
hello
world

This instance uses the Pretty Text instance, and uses the same newline to line conversion.

Instance details

Defined in Prettyprinter.Internal

Methods

fromString :: String -> Doc ann #

IsString (SomeMessage master) 
Instance details

Defined in Text.Shakespeare.I18N

Methods

fromString :: String -> SomeMessage master #

IsString msg => IsString (BootstrapSubmit msg) 
Instance details

Defined in Yesod.Form.Bootstrap3

IsString (FieldSettings a) 
Instance details

Defined in Yesod.Form.Types

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] #

a ~ () => IsString (WidgetFor site a)

A String can be trivially promoted to a widget.

For example, in a yesod-scaffold site you could use:

getHomeR = do defaultLayout "Widget text"
Instance details

Defined in Yesod.Core.Types

Methods

fromString :: String -> WidgetFor site a #

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.

Example

Expand

Used in combination with (<$>), (<*>) can be used to build a record.

>>> data MyState = MyState {arg1 :: Foo, arg2 :: Bar, arg3 :: Baz}
>>> produceFoo :: Applicative f => f Foo
>>> produceBar :: Applicative f => f Bar
>>> produceBaz :: Applicative f => f Baz
>>> mkState :: Applicative f => f MyState
>>> mkState = MyState <$> produceFoo <*> produceBar <*> produceBaz

liftA2 :: (a -> b -> c) -> f a -> f b -> f c #

Lift a binary function to actions.

Some functors support an implementation of liftA2 that is more efficient than the default one. In particular, if fmap is an expensive operation, it is likely better to use liftA2 than to fmap over the structure and then use <*>.

This became a typeclass method in 4.10.0.0. Prior to that, it was a function defined in terms of <*> and fmap.

Example

Expand
>>> liftA2 (,) (Just 3) (Just 5)
Just (3,5)

(*>) :: f a -> f b -> f b infixl 4 #

Sequence actions, discarding the value of the first argument.

Examples

Expand

If used in conjunction with the Applicative instance for Maybe, you can chain Maybe computations, with a possible "early return" in case of Nothing.

>>> Just 2 *> Just 3
Just 3
>>> Nothing *> Just 3
Nothing

Of course a more interesting use case would be to have effectful computations instead of just returning pure values.

>>> import Data.Char
>>> import Text.ParserCombinators.ReadP
>>> let p = string "my name is " *> munch1 isAlpha <* eof
>>> readP_to_S p "my name is Simon"
[("Simon","")]

(<*) :: f a -> f b -> f a infixl 4 #

Sequence actions, discarding the value of the second argument.

Instances

Instances details
Applicative IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

pure :: a -> IResult a #

(<*>) :: IResult (a -> b) -> IResult a -> IResult b #

liftA2 :: (a -> b -> c) -> IResult a -> IResult b -> IResult c #

(*>) :: IResult a -> IResult b -> IResult b #

(<*) :: IResult a -> IResult b -> IResult a #

Applicative Parser 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

pure :: a -> Parser a #

(<*>) :: Parser (a -> b) -> Parser a -> Parser b #

liftA2 :: (a -> b -> c) -> Parser a -> Parser b -> Parser c #

(*>) :: Parser a -> Parser b -> Parser b #

(<*) :: Parser a -> Parser b -> Parser a #

Applicative Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

pure :: a -> Result a #

(<*>) :: Result (a -> b) -> Result a -> Result b #

liftA2 :: (a -> b -> c) -> Result a -> Result b -> Result c #

(*>) :: Result a -> Result b -> Result b #

(<*) :: Result a -> Result b -> Result a #

Applicative Concurrently 
Instance details

Defined in Control.Concurrent.Async

Applicative ZipList
f <$> ZipList xs1 <*> ... <*> ZipList xsN
    = ZipList (zipWithN f xs1 ... xsN)

where zipWithN refers to the zipWith function of the appropriate arity (zipWith, zipWith3, zipWith4, ...). For example:

(\a b c -> stimes c [a, b]) <$> ZipList "abcd" <*> ZipList "567" <*> ZipList [1..]
    = ZipList (zipWith3 (\a b c -> stimes c [a, b]) "abcd" "567" [1..])
    = ZipList {getZipList = ["a5","b6b6","c7c7c7"]}

Since: base-2.1

Instance details

Defined in Control.Applicative

Methods

pure :: a -> ZipList a #

(<*>) :: ZipList (a -> b) -> ZipList a -> ZipList b #

liftA2 :: (a -> b -> c) -> ZipList a -> ZipList b -> ZipList c #

(*>) :: ZipList a -> ZipList b -> ZipList b #

(<*) :: ZipList a -> ZipList b -> ZipList a #

Applicative Complex

Since: base-4.9.0.0

Instance details

Defined in Data.Complex

Methods

pure :: a -> Complex a #

(<*>) :: Complex (a -> b) -> Complex a -> Complex b #

liftA2 :: (a -> b -> c) -> Complex a -> Complex b -> Complex c #

(*>) :: Complex a -> Complex b -> Complex b #

(<*) :: Complex a -> Complex b -> Complex a #

Applicative Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

pure :: a -> Identity a #

(<*>) :: Identity (a -> b) -> Identity a -> Identity b #

liftA2 :: (a -> b -> c) -> Identity a -> Identity b -> Identity c #

(*>) :: Identity a -> Identity b -> Identity b #

(<*) :: Identity a -> Identity b -> Identity a #

Applicative First

Since: base-4.8.0.0

Instance details

Defined in Data.Monoid

Methods

pure :: a -> First a #

(<*>) :: First (a -> b) -> First a -> First b #

liftA2 :: (a -> b -> c) -> First a -> First b -> First c #

(*>) :: First a -> First b -> First b #

(<*) :: First a -> First b -> First a #

Applicative Last

Since: base-4.8.0.0

Instance details

Defined in Data.Monoid

Methods

pure :: a -> Last a #

(<*>) :: Last (a -> b) -> Last a -> Last b #

liftA2 :: (a -> b -> c) -> Last a -> Last b -> Last c #

(*>) :: Last a -> Last b -> Last b #

(<*) :: Last a -> Last b -> Last a #

Applicative Down

Since: base-4.11.0.0

Instance details

Defined in Data.Ord

Methods

pure :: a -> Down a #

(<*>) :: Down (a -> b) -> Down a -> Down b #

liftA2 :: (a -> b -> c) -> Down a -> Down b -> Down c #

(*>) :: Down a -> Down b -> Down b #

(<*) :: Down a -> Down b -> Down a #

Applicative First

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

pure :: a -> First a #

(<*>) :: First (a -> b) -> First a -> First b #

liftA2 :: (a -> b -> c) -> First a -> First b -> First c #

(*>) :: First a -> First b -> First b #

(<*) :: First a -> First b -> First a #

Applicative Last

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

pure :: a -> Last a #

(<*>) :: Last (a -> b) -> Last a -> Last b #

liftA2 :: (a -> b -> c) -> Last a -> Last b -> Last c #

(*>) :: Last a -> Last b -> Last b #

(<*) :: Last a -> Last b -> Last a #

Applicative Max

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

pure :: a -> Max a #

(<*>) :: Max (a -> b) -> Max a -> Max b #

liftA2 :: (a -> b -> c) -> Max a -> Max b -> Max c #

(*>) :: Max a -> Max b -> Max b #

(<*) :: Max a -> Max b -> Max a #

Applicative Min

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

pure :: a -> Min a #

(<*>) :: Min (a -> b) -> Min a -> Min b #

liftA2 :: (a -> b -> c) -> Min a -> Min b -> Min c #

(*>) :: Min a -> Min b -> Min b #

(<*) :: Min a -> Min b -> Min a #

Applicative 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 Dual

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

pure :: a -> Dual a #

(<*>) :: Dual (a -> b) -> Dual a -> Dual b #

liftA2 :: (a -> b -> c) -> Dual a -> Dual b -> Dual c #

(*>) :: Dual a -> Dual b -> Dual b #

(<*) :: Dual a -> Dual b -> Dual a #

Applicative Product

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

pure :: a -> Product a #

(<*>) :: Product (a -> b) -> Product a -> Product b #

liftA2 :: (a -> b -> c) -> Product a -> Product b -> Product c #

(*>) :: Product a -> Product b -> Product b #

(<*) :: Product a -> Product b -> Product a #

Applicative Sum

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

pure :: a -> Sum a #

(<*>) :: Sum (a -> b) -> Sum a -> Sum b #

liftA2 :: (a -> b -> c) -> Sum a -> Sum b -> Sum c #

(*>) :: Sum a -> Sum b -> Sum b #

(<*) :: Sum a -> Sum b -> Sum a #

Applicative 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 STM

Since: base-4.8.0.0

Instance details

Defined in GHC.Conc.Sync

Methods

pure :: a -> STM a #

(<*>) :: STM (a -> b) -> STM a -> STM b #

liftA2 :: (a -> b -> c) -> STM a -> STM b -> STM c #

(*>) :: STM a -> STM b -> STM b #

(<*) :: STM a -> STM b -> STM a #

Applicative Par1

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

pure :: a -> Par1 a #

(<*>) :: Par1 (a -> b) -> Par1 a -> Par1 b #

liftA2 :: (a -> b -> c) -> Par1 a -> Par1 b -> Par1 c #

(*>) :: Par1 a -> Par1 b -> Par1 b #

(<*) :: Par1 a -> Par1 b -> Par1 a #

Applicative P

Since: base-4.5.0.0

Instance details

Defined in Text.ParserCombinators.ReadP

Methods

pure :: a -> P a #

(<*>) :: P (a -> b) -> P a -> P b #

liftA2 :: (a -> b -> c) -> P a -> P b -> P c #

(*>) :: P a -> P b -> P b #

(<*) :: P a -> P b -> P a #

Applicative ReadP

Since: base-4.6.0.0

Instance details

Defined in Text.ParserCombinators.ReadP

Methods

pure :: a -> ReadP a #

(<*>) :: ReadP (a -> b) -> ReadP a -> ReadP b #

liftA2 :: (a -> b -> c) -> ReadP a -> ReadP b -> ReadP c #

(*>) :: ReadP a -> ReadP b -> ReadP b #

(<*) :: ReadP a -> ReadP b -> ReadP a #

Applicative 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 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 MarkupM 
Instance details

Defined in Text.Blaze.Internal

Methods

pure :: a -> MarkupM a #

(<*>) :: MarkupM (a -> b) -> MarkupM a -> MarkupM b #

liftA2 :: (a -> b -> c) -> MarkupM a -> MarkupM b -> MarkupM c #

(*>) :: MarkupM a -> MarkupM b -> MarkupM b #

(<*) :: MarkupM a -> MarkupM b -> MarkupM 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 Identifier 
Instance details

Defined in Text.Casing

Methods

pure :: a -> Identifier a #

(<*>) :: Identifier (a -> b) -> Identifier a -> Identifier b #

liftA2 :: (a -> b -> c) -> Identifier a -> Identifier b -> Identifier c #

(*>) :: Identifier a -> Identifier b -> Identifier b #

(<*) :: Identifier a -> Identifier b -> Identifier a #

Applicative Seq

Since: containers-0.5.4

Instance details

Defined in Data.Sequence.Internal

Methods

pure :: a -> Seq a #

(<*>) :: Seq (a -> b) -> Seq a -> Seq b #

liftA2 :: (a -> b -> c) -> Seq a -> Seq b -> Seq c #

(*>) :: Seq a -> Seq b -> Seq b #

(<*) :: Seq a -> Seq b -> Seq a #

Applicative Tree 
Instance details

Defined in Data.Tree

Methods

pure :: a -> Tree a #

(<*>) :: Tree (a -> b) -> Tree a -> Tree b #

liftA2 :: (a -> b -> c) -> Tree a -> Tree b -> Tree c #

(*>) :: Tree a -> Tree b -> Tree b #

(<*) :: Tree a -> Tree b -> Tree a #

Applicative CryptoFailable 
Instance details

Defined in Crypto.Error.Types

Applicative DNonEmpty 
Instance details

Defined in Data.DList.DNonEmpty.Internal

Methods

pure :: a -> DNonEmpty a #

(<*>) :: DNonEmpty (a -> b) -> DNonEmpty a -> DNonEmpty b #

liftA2 :: (a -> b -> c) -> DNonEmpty a -> DNonEmpty b -> DNonEmpty c #

(*>) :: DNonEmpty a -> DNonEmpty b -> DNonEmpty b #

(<*) :: DNonEmpty a -> DNonEmpty b -> DNonEmpty a #

Applicative DList 
Instance details

Defined in Data.DList.Internal

Methods

pure :: a -> DList a #

(<*>) :: DList (a -> b) -> DList a -> DList b #

liftA2 :: (a -> b -> c) -> DList a -> DList b -> DList c #

(*>) :: DList a -> DList b -> DList b #

(<*) :: DList a -> DList b -> DList a #

Applicative SqlQuery 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Methods

pure :: a -> SqlQuery a #

(<*>) :: SqlQuery (a -> b) -> SqlQuery a -> SqlQuery b #

liftA2 :: (a -> b -> c) -> SqlQuery a -> SqlQuery b -> SqlQuery c #

(*>) :: SqlQuery a -> SqlQuery b -> SqlQuery b #

(<*) :: SqlQuery a -> SqlQuery b -> SqlQuery a #

Applicative Value 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Methods

pure :: a -> Value a #

(<*>) :: Value (a -> b) -> Value a -> Value b #

liftA2 :: (a -> b -> c) -> Value a -> Value b -> Value c #

(*>) :: Value a -> Value b -> Value b #

(<*) :: Value a -> Value b -> Value 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 Conversion 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Methods

pure :: a -> Conversion a #

(<*>) :: Conversion (a -> b) -> Conversion a -> Conversion b #

liftA2 :: (a -> b -> c) -> Conversion a -> Conversion b -> Conversion c #

(*>) :: Conversion a -> Conversion b -> Conversion b #

(<*) :: Conversion a -> Conversion b -> Conversion a #

Applicative RowParser 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Methods

pure :: a -> RowParser a #

(<*>) :: RowParser (a -> b) -> RowParser a -> RowParser b #

liftA2 :: (a -> b -> c) -> RowParser a -> RowParser b -> RowParser c #

(*>) :: RowParser a -> RowParser b -> RowParser b #

(<*) :: RowParser a -> RowParser b -> RowParser a #

Applicative Array 
Instance details

Defined in Data.Primitive.Array

Methods

pure :: a -> Array a #

(<*>) :: Array (a -> b) -> Array a -> Array b #

liftA2 :: (a -> b -> c) -> Array a -> Array b -> Array c #

(*>) :: Array a -> Array b -> Array b #

(<*) :: Array a -> Array b -> Array a #

Applicative SmallArray 
Instance details

Defined in Data.Primitive.SmallArray

Methods

pure :: a -> SmallArray a #

(<*>) :: SmallArray (a -> b) -> SmallArray a -> SmallArray b #

liftA2 :: (a -> b -> c) -> SmallArray a -> SmallArray b -> SmallArray c #

(*>) :: SmallArray a -> SmallArray b -> SmallArray b #

(<*) :: SmallArray a -> SmallArray b -> SmallArray a #

Applicative 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 Acquire 
Instance details

Defined in Data.Acquire.Internal

Methods

pure :: a -> Acquire a #

(<*>) :: Acquire (a -> b) -> Acquire a -> Acquire b #

liftA2 :: (a -> b -> c) -> Acquire a -> Acquire b -> Acquire c #

(*>) :: Acquire a -> Acquire b -> Acquire b #

(<*) :: Acquire a -> Acquire b -> Acquire a #

Applicative Result 
Instance details

Defined in Text.Hamlet.Parse

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 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 Flat 
Instance details

Defined in UnliftIO.Internals.Async

Methods

pure :: a -> Flat a #

(<*>) :: Flat (a -> b) -> Flat a -> Flat b #

liftA2 :: (a -> b -> c) -> Flat a -> Flat b -> Flat c #

(*>) :: Flat a -> Flat b -> Flat b #

(<*) :: Flat a -> Flat b -> Flat a #

Applicative FlatApp 
Instance details

Defined in UnliftIO.Internals.Async

Methods

pure :: a -> FlatApp a #

(<*>) :: FlatApp (a -> b) -> FlatApp a -> FlatApp b #

liftA2 :: (a -> b -> c) -> FlatApp a -> FlatApp b -> FlatApp c #

(*>) :: FlatApp a -> FlatApp b -> FlatApp b #

(<*) :: FlatApp a -> FlatApp b -> FlatApp a #

Applicative Memoized 
Instance details

Defined in UnliftIO.Memoize

Methods

pure :: a -> Memoized a #

(<*>) :: Memoized (a -> b) -> Memoized a -> Memoized b #

liftA2 :: (a -> b -> c) -> Memoized a -> Memoized b -> Memoized c #

(*>) :: Memoized a -> Memoized b -> Memoized b #

(<*) :: Memoized a -> Memoized b -> Memoized a #

Applicative Vector 
Instance details

Defined in Data.Vector

Methods

pure :: a -> Vector a #

(<*>) :: Vector (a -> b) -> Vector a -> Vector b #

liftA2 :: (a -> b -> c) -> Vector a -> Vector b -> Vector c #

(*>) :: Vector a -> Vector b -> Vector b #

(<*) :: Vector a -> Vector b -> Vector a #

Applicative 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 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 FormResult 
Instance details

Defined in Yesod.Form.Types

Methods

pure :: a -> FormResult a #

(<*>) :: FormResult (a -> b) -> FormResult a -> FormResult b #

liftA2 :: (a -> b -> c) -> FormResult a -> FormResult b -> FormResult c #

(*>) :: FormResult a -> FormResult b -> FormResult b #

(<*) :: FormResult a -> FormResult b -> FormResult 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 Maybe

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

pure :: a -> Maybe a #

(<*>) :: Maybe (a -> b) -> Maybe a -> Maybe b #

liftA2 :: (a -> b -> c) -> Maybe a -> Maybe b -> Maybe c #

(*>) :: Maybe a -> Maybe b -> Maybe b #

(<*) :: Maybe a -> Maybe b -> Maybe a #

Applicative Solo

Since: base-4.15

Instance details

Defined in GHC.Base

Methods

pure :: a -> Solo a #

(<*>) :: Solo (a -> b) -> Solo a -> Solo b #

liftA2 :: (a -> b -> c) -> Solo a -> Solo b -> Solo c #

(*>) :: Solo a -> Solo b -> Solo b #

(<*) :: Solo a -> Solo b -> Solo a #

Applicative []

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

pure :: a -> [a] #

(<*>) :: [a -> b] -> [a] -> [b] #

liftA2 :: (a -> b -> c) -> [a] -> [b] -> [c] #

(*>) :: [a] -> [b] -> [b] #

(<*) :: [a] -> [b] -> [a] #

Representable f => Applicative (Co f) 
Instance details

Defined in Data.Functor.Rep

Methods

pure :: a -> Co f a #

(<*>) :: Co f (a -> b) -> Co f a -> Co f b #

liftA2 :: (a -> b -> c) -> Co f a -> Co f b -> Co f c #

(*>) :: Co f a -> Co f b -> Co f b #

(<*) :: Co f a -> Co f b -> Co f a #

Applicative (Parser i) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

pure :: a -> Parser i a #

(<*>) :: Parser i (a -> b) -> Parser i a -> Parser i b #

liftA2 :: (a -> b -> c) -> Parser i a -> Parser i b -> Parser i c #

(*>) :: Parser i a -> Parser i b -> Parser i b #

(<*) :: Parser i a -> Parser i b -> Parser i a #

Monad m => Applicative (WrappedMonad m)

Since: base-2.1

Instance details

Defined in Control.Applicative

Methods

pure :: a -> WrappedMonad m a #

(<*>) :: WrappedMonad m (a -> b) -> WrappedMonad m a -> WrappedMonad m b #

liftA2 :: (a -> b -> c) -> WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m c #

(*>) :: WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m b #

(<*) :: WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m a #

Arrow a => Applicative (ArrowMonad a)

Since: base-4.6.0.0

Instance details

Defined in Control.Arrow

Methods

pure :: a0 -> ArrowMonad a a0 #

(<*>) :: ArrowMonad a (a0 -> b) -> ArrowMonad a a0 -> ArrowMonad a b #

liftA2 :: (a0 -> b -> c) -> ArrowMonad a a0 -> ArrowMonad a b -> ArrowMonad a c #

(*>) :: ArrowMonad a a0 -> ArrowMonad a b -> ArrowMonad a b #

(<*) :: ArrowMonad a a0 -> ArrowMonad a b -> ArrowMonad a a0 #

Applicative (ST s)

Since: base-2.1

Instance details

Defined in Control.Monad.ST.Lazy.Imp

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 #

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 (Proxy :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

pure :: a -> Proxy a #

(<*>) :: Proxy (a -> b) -> Proxy a -> Proxy b #

liftA2 :: (a -> b -> c) -> Proxy a -> Proxy b -> Proxy c #

(*>) :: Proxy a -> Proxy b -> Proxy b #

(<*) :: Proxy a -> Proxy b -> Proxy a #

Applicative (U1 :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

pure :: a -> U1 a #

(<*>) :: U1 (a -> b) -> U1 a -> U1 b #

liftA2 :: (a -> b -> c) -> U1 a -> U1 b -> U1 c #

(*>) :: U1 a -> U1 b -> U1 b #

(<*) :: U1 a -> U1 b -> U1 a #

Applicative (ST s)

Since: base-4.4.0.0

Instance details

Defined in GHC.ST

Methods

pure :: a -> ST s a #

(<*>) :: ST s (a -> b) -> ST s a -> ST s b #

liftA2 :: (a -> b -> c) -> ST s a -> ST s b -> ST s c #

(*>) :: ST s a -> ST s b -> ST s b #

(<*) :: ST s a -> ST s b -> ST s a #

Applicative m => Applicative (AppM m) Source # 
Instance details

Defined in BtcLsp.Data.AppM

Methods

pure :: a -> AppM m a #

(<*>) :: AppM m (a -> b) -> AppM m a -> AppM m b #

liftA2 :: (a -> b -> c) -> AppM m a -> AppM m b -> AppM m c #

(*>) :: AppM m a -> AppM m b -> AppM m b #

(<*) :: AppM m a -> AppM m b -> AppM 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 #

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 #

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 #

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 #

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 #

Applicative (EitherR r) 
Instance details

Defined in Data.EitherR

Methods

pure :: a -> EitherR r a #

(<*>) :: EitherR r (a -> b) -> EitherR r a -> EitherR r b #

liftA2 :: (a -> b -> c) -> EitherR r a -> EitherR r b -> EitherR r c #

(*>) :: EitherR r a -> EitherR r b -> EitherR r b #

(<*) :: EitherR r a -> EitherR r b -> EitherR r a #

Monad m => Applicative (CatchT m) 
Instance details

Defined in Control.Monad.Catch.Pure

Methods

pure :: a -> CatchT m a #

(<*>) :: CatchT m (a -> b) -> CatchT m a -> CatchT m b #

liftA2 :: (a -> b -> c) -> CatchT m a -> CatchT m b -> CatchT m c #

(*>) :: CatchT m a -> CatchT m b -> CatchT m b #

(<*) :: CatchT m a -> CatchT m b -> CatchT m a #

Alternative f => Applicative (Cofree f) 
Instance details

Defined in Control.Comonad.Cofree

Methods

pure :: a -> Cofree f a #

(<*>) :: Cofree f (a -> b) -> Cofree f a -> Cofree f b #

liftA2 :: (a -> b -> c) -> Cofree f a -> Cofree f b -> Cofree f c #

(*>) :: Cofree f a -> Cofree f b -> Cofree f b #

(<*) :: Cofree f a -> Cofree f b -> Cofree f a #

Functor f => Applicative (Free f) 
Instance details

Defined in Control.Monad.Free

Methods

pure :: a -> Free f a #

(<*>) :: Free f (a -> b) -> Free f a -> Free f b #

liftA2 :: (a -> b -> c) -> Free f a -> Free f b -> Free f c #

(*>) :: Free f a -> Free f b -> Free f b #

(<*) :: Free f a -> Free f b -> Free f a #

Applicative 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 #

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 #

Applicative (StateL s) 
Instance details

Defined in Data.Key

Methods

pure :: a -> StateL s a #

(<*>) :: StateL s (a -> b) -> StateL s a -> StateL s b #

liftA2 :: (a -> b -> c) -> StateL s a -> StateL s b -> StateL s c #

(*>) :: StateL s a -> StateL s b -> StateL s b #

(<*) :: StateL s a -> StateL s b -> StateL s a #

Applicative (StateR s) 
Instance details

Defined in Data.Key

Methods

pure :: a -> StateR s a #

(<*>) :: StateR s (a -> b) -> StateR s a -> StateR s b #

liftA2 :: (a -> b -> c) -> StateR s a -> StateR s b -> StateR s c #

(*>) :: StateR s a -> StateR s b -> StateR s b #

(<*) :: StateR s a -> StateR s b -> StateR s a #

Applicative m => Applicative (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

pure :: a -> LoggingT m a #

(<*>) :: LoggingT m (a -> b) -> LoggingT m a -> LoggingT m b #

liftA2 :: (a -> b -> c) -> LoggingT m a -> LoggingT m b -> LoggingT m c #

(*>) :: LoggingT m a -> LoggingT m b -> LoggingT m b #

(<*) :: LoggingT m a -> LoggingT m b -> LoggingT m a #

Applicative m => Applicative (NoLoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

pure :: a -> NoLoggingT m a #

(<*>) :: NoLoggingT m (a -> b) -> NoLoggingT m a -> NoLoggingT m b #

liftA2 :: (a -> b -> c) -> NoLoggingT m a -> NoLoggingT m b -> NoLoggingT m c #

(*>) :: NoLoggingT m a -> NoLoggingT m b -> NoLoggingT m b #

(<*) :: NoLoggingT m a -> NoLoggingT m b -> NoLoggingT m a #

Applicative m => Applicative (WriterLoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

pure :: a -> WriterLoggingT m a #

(<*>) :: WriterLoggingT m (a -> b) -> WriterLoggingT m a -> WriterLoggingT m b #

liftA2 :: (a -> b -> c) -> WriterLoggingT m a -> WriterLoggingT m b -> WriterLoggingT m c #

(*>) :: WriterLoggingT m a -> WriterLoggingT m b -> WriterLoggingT m b #

(<*) :: WriterLoggingT m a -> WriterLoggingT m b -> WriterLoggingT m a #

Applicative f => Applicative (WrappedPoly f) 
Instance details

Defined in Data.MonoTraversable

Methods

pure :: a -> WrappedPoly f a #

(<*>) :: WrappedPoly f (a -> b) -> WrappedPoly f a -> WrappedPoly f b #

liftA2 :: (a -> b -> c) -> WrappedPoly f a -> WrappedPoly f b -> WrappedPoly f c #

(*>) :: WrappedPoly f a -> WrappedPoly f b -> WrappedPoly f b #

(<*) :: WrappedPoly f a -> WrappedPoly f b -> WrappedPoly f a #

Applicative m => Applicative (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

pure :: a -> ResourceT m a #

(<*>) :: ResourceT m (a -> b) -> ResourceT m a -> ResourceT m b #

liftA2 :: (a -> b -> c) -> ResourceT m a -> ResourceT m b -> ResourceT m c #

(*>) :: ResourceT m a -> ResourceT m b -> ResourceT m b #

(<*) :: ResourceT m a -> ResourceT m b -> ResourceT m a #

Apply f => Applicative (MaybeApply f) 
Instance details

Defined in Data.Functor.Bind.Class

Methods

pure :: a -> MaybeApply f a #

(<*>) :: MaybeApply f (a -> b) -> MaybeApply f a -> MaybeApply f b #

liftA2 :: (a -> b -> c) -> MaybeApply f a -> MaybeApply f b -> MaybeApply f c #

(*>) :: MaybeApply f a -> MaybeApply f b -> MaybeApply f b #

(<*) :: MaybeApply f a -> MaybeApply f b -> MaybeApply f a #

Applicative f => Applicative (WrappedApplicative f) 
Instance details

Defined in Data.Functor.Bind.Class

Semigroup a => Applicative (These a) 
Instance details

Defined in Data.Strict.These

Methods

pure :: a0 -> These a a0 #

(<*>) :: These a (a0 -> b) -> These a a0 -> These a b #

liftA2 :: (a0 -> b -> c) -> These a a0 -> These a b -> These a c #

(*>) :: These a a0 -> These a b -> These a b #

(<*) :: These a a0 -> These a b -> These a a0 #

Semigroup a => Applicative (These a) 
Instance details

Defined in Data.These

Methods

pure :: a0 -> These a a0 #

(<*>) :: These a (a0 -> b) -> These a a0 -> These a b #

liftA2 :: (a0 -> b -> c) -> These a a0 -> These a b -> These a c #

(*>) :: These a a0 -> These a b -> These a b #

(<*) :: These a a0 -> These a b -> These a a0 #

Applicative f => Applicative (Lift f)

A combination is Pure only if both parts are.

Instance details

Defined in Control.Applicative.Lift

Methods

pure :: a -> Lift f a #

(<*>) :: Lift f (a -> b) -> Lift f a -> Lift f b #

liftA2 :: (a -> b -> c) -> Lift f a -> Lift f b -> Lift f c #

(*>) :: Lift f a -> Lift f b -> Lift f b #

(<*) :: Lift f a -> Lift f b -> Lift f a #

Applicative m => Applicative (ListT m) 
Instance details

Defined in Control.Monad.Trans.List

Methods

pure :: a -> ListT m a #

(<*>) :: ListT m (a -> b) -> ListT m a -> ListT m b #

liftA2 :: (a -> b -> c) -> ListT m a -> ListT m b -> ListT m c #

(*>) :: ListT m a -> ListT m b -> ListT m b #

(<*) :: ListT m a -> ListT m b -> ListT m a #

(Functor m, Monad m) => Applicative (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

pure :: a -> MaybeT m a #

(<*>) :: MaybeT m (a -> b) -> MaybeT m a -> MaybeT m b #

liftA2 :: (a -> b -> c) -> MaybeT m a -> MaybeT m b -> MaybeT m c #

(*>) :: MaybeT m a -> MaybeT m b -> MaybeT m b #

(<*) :: MaybeT m a -> MaybeT m b -> MaybeT m a #

MonadUnliftIO m => Applicative (Conc m)

Since: unliftio-0.2.9.0

Instance details

Defined in UnliftIO.Internals.Async

Methods

pure :: a -> Conc m a #

(<*>) :: Conc m (a -> b) -> Conc m a -> Conc m b #

liftA2 :: (a -> b -> c) -> Conc m a -> Conc m b -> Conc m c #

(*>) :: Conc m a -> Conc m b -> Conc m b #

(<*) :: Conc m a -> Conc m b -> Conc m a #

MonadUnliftIO m => Applicative (Concurrently m)

Since: unliftio-0.1.0.0

Instance details

Defined in UnliftIO.Internals.Async

Methods

pure :: a -> Concurrently m a #

(<*>) :: Concurrently m (a -> b) -> Concurrently m a -> Concurrently m b #

liftA2 :: (a -> b -> c) -> Concurrently m a -> Concurrently m b -> Concurrently m c #

(*>) :: Concurrently m a -> Concurrently m b -> Concurrently m b #

(<*) :: Concurrently m a -> Concurrently m b -> Concurrently m a #

Applicative (HandlerFor site) 
Instance details

Defined in Yesod.Core.Types

Methods

pure :: a -> HandlerFor site a #

(<*>) :: HandlerFor site (a -> b) -> HandlerFor site a -> HandlerFor site b #

liftA2 :: (a -> b -> c) -> HandlerFor site a -> HandlerFor site b -> HandlerFor site c #

(*>) :: HandlerFor site a -> HandlerFor site b -> HandlerFor site b #

(<*) :: HandlerFor site a -> HandlerFor site b -> HandlerFor site a #

Applicative (WidgetFor site) 
Instance details

Defined in Yesod.Core.Types

Methods

pure :: a -> WidgetFor site a #

(<*>) :: WidgetFor site (a -> b) -> WidgetFor site a -> WidgetFor site b #

liftA2 :: (a -> b -> c) -> WidgetFor site a -> WidgetFor site b -> WidgetFor site c #

(*>) :: WidgetFor site a -> WidgetFor site b -> WidgetFor site b #

(<*) :: WidgetFor site a -> WidgetFor site b -> WidgetFor site a #

Monad m => Applicative (FormInput m) 
Instance details

Defined in Yesod.Form.Input

Methods

pure :: a -> FormInput m a #

(<*>) :: FormInput m (a -> b) -> FormInput m a -> FormInput m b #

liftA2 :: (a -> b -> c) -> FormInput m a -> FormInput m b -> FormInput m c #

(*>) :: FormInput m a -> FormInput m b -> FormInput m b #

(<*) :: FormInput m a -> FormInput m b -> FormInput m a #

Monad m => Applicative (AForm m) 
Instance details

Defined in Yesod.Form.Types

Methods

pure :: a -> AForm m a #

(<*>) :: AForm m (a -> b) -> AForm m a -> AForm m b #

liftA2 :: (a -> b -> c) -> AForm m a -> AForm m b -> AForm m c #

(*>) :: AForm m a -> AForm m b -> AForm m b #

(<*) :: AForm m a -> AForm m b -> AForm m a #

Monoid a => Applicative ((,) a)

For tuples, the Monoid constraint on a determines how the first values merge. For example, Strings concatenate:

("hello ", (+15)) <*> ("world!", 2002)
("hello world!",2017)

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

pure :: a0 -> (a, a0) #

(<*>) :: (a, a0 -> b) -> (a, a0) -> (a, b) #

liftA2 :: (a0 -> b -> c) -> (a, a0) -> (a, b) -> (a, c) #

(*>) :: (a, a0) -> (a, b) -> (a, b) #

(<*) :: (a, a0) -> (a, b) -> (a, a0) #

Arrow a => Applicative (WrappedArrow a b)

Since: base-2.1

Instance details

Defined in Control.Applicative

Methods

pure :: a0 -> WrappedArrow a b a0 #

(<*>) :: WrappedArrow a b (a0 -> b0) -> WrappedArrow a b a0 -> WrappedArrow a b b0 #

liftA2 :: (a0 -> b0 -> c) -> WrappedArrow a b a0 -> WrappedArrow a b b0 -> WrappedArrow a b c #

(*>) :: WrappedArrow a b a0 -> WrappedArrow a b b0 -> WrappedArrow a b b0 #

(<*) :: WrappedArrow a b a0 -> WrappedArrow a b b0 -> WrappedArrow a b a0 #

Applicative m => Applicative (Kleisli m a)

Since: base-4.14.0.0

Instance details

Defined in Control.Arrow

Methods

pure :: a0 -> Kleisli m a a0 #

(<*>) :: Kleisli m a (a0 -> b) -> Kleisli m a a0 -> Kleisli m a b #

liftA2 :: (a0 -> b -> c) -> Kleisli m a a0 -> Kleisli m a b -> Kleisli m a c #

(*>) :: Kleisli m a a0 -> Kleisli m a b -> Kleisli m a b #

(<*) :: Kleisli m a a0 -> Kleisli m a b -> Kleisli m a a0 #

Monoid m => Applicative (Const m :: Type -> Type)

Since: base-2.0.1

Instance details

Defined in Data.Functor.Const

Methods

pure :: a -> Const m a #

(<*>) :: Const m (a -> b) -> Const m a -> Const m b #

liftA2 :: (a -> b -> c) -> Const m a -> Const m b -> Const m c #

(*>) :: Const m a -> Const m b -> Const m b #

(<*) :: Const m a -> Const m b -> Const m a #

Applicative f => Applicative (Ap f)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

pure :: a -> Ap f a #

(<*>) :: Ap f (a -> b) -> Ap f a -> Ap f b #

liftA2 :: (a -> b -> c) -> Ap f a -> Ap f b -> Ap f c #

(*>) :: Ap f a -> Ap f b -> Ap f b #

(<*) :: Ap f a -> Ap f b -> Ap f a #

Applicative f => Applicative (Alt f)

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

pure :: a -> Alt f a #

(<*>) :: Alt f (a -> b) -> Alt f a -> Alt f b #

liftA2 :: (a -> b -> c) -> Alt f a -> Alt f b -> Alt f c #

(*>) :: Alt f a -> Alt f b -> Alt f b #

(<*) :: Alt f a -> Alt f b -> Alt f a #

Applicative f => Applicative (Rec1 f)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

pure :: a -> Rec1 f a #

(<*>) :: Rec1 f (a -> b) -> Rec1 f a -> Rec1 f b #

liftA2 :: (a -> b -> c) -> Rec1 f a -> Rec1 f b -> Rec1 f c #

(*>) :: Rec1 f a -> Rec1 f b -> Rec1 f b #

(<*) :: Rec1 f a -> Rec1 f b -> Rec1 f a #

Applicative (Mag a b) 
Instance details

Defined in Data.Biapplicative

Methods

pure :: a0 -> Mag a b a0 #

(<*>) :: Mag a b (a0 -> b0) -> Mag a b a0 -> Mag a b b0 #

liftA2 :: (a0 -> b0 -> c) -> Mag a b a0 -> Mag a b b0 -> Mag a b c #

(*>) :: Mag a b a0 -> Mag a b b0 -> Mag a b b0 #

(<*) :: Mag a b a0 -> Mag a b b0 -> Mag a b a0 #

Biapplicative p => Applicative (Join p) 
Instance details

Defined in Data.Bifunctor.Join

Methods

pure :: a -> Join p a #

(<*>) :: Join p (a -> b) -> Join p a -> Join p b #

liftA2 :: (a -> b -> c) -> Join p a -> Join p b -> Join p c #

(*>) :: Join p a -> Join p b -> Join p b #

(<*) :: Join p a -> Join p b -> Join p a #

(Monoid e, Applicative m) => Applicative (EnvT e m) 
Instance details

Defined in Control.Comonad.Trans.Env

Methods

pure :: a -> EnvT e m a #

(<*>) :: EnvT e m (a -> b) -> EnvT e m a -> EnvT e m b #

liftA2 :: (a -> b -> c) -> EnvT e m a -> EnvT e m b -> EnvT e m c #

(*>) :: EnvT e m a -> EnvT e m b -> EnvT e m b #

(<*) :: EnvT e m a -> EnvT e m b -> EnvT e m a #

(Applicative w, Monoid s) => Applicative (StoreT s w) 
Instance details

Defined in Control.Comonad.Trans.Store

Methods

pure :: a -> StoreT s w a #

(<*>) :: StoreT s w (a -> b) -> StoreT s w a -> StoreT s w b #

liftA2 :: (a -> b -> c) -> StoreT s w a -> StoreT s w b -> StoreT s w c #

(*>) :: StoreT s w a -> StoreT s w b -> StoreT s w b #

(<*) :: StoreT s w a -> StoreT s w b -> StoreT s w a #

Applicative w => Applicative (TracedT m w) 
Instance details

Defined in Control.Comonad.Trans.Traced

Methods

pure :: a -> TracedT m w a #

(<*>) :: TracedT m w (a -> b) -> TracedT m w a -> TracedT m w b #

liftA2 :: (a -> b -> c) -> TracedT m w a -> TracedT m w b -> TracedT m w c #

(*>) :: TracedT m w a -> TracedT m w b -> TracedT m w b #

(<*) :: TracedT m w a -> TracedT m w b -> TracedT m w a #

Monad m => Applicative (ZipSink i m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

pure :: a -> ZipSink i m a #

(<*>) :: ZipSink i m (a -> b) -> ZipSink i m a -> ZipSink i m b #

liftA2 :: (a -> b -> c) -> ZipSink i m a -> ZipSink i m b -> ZipSink i m c #

(*>) :: ZipSink i m a -> ZipSink i m b -> ZipSink i m b #

(<*) :: ZipSink i m a -> ZipSink i m b -> ZipSink i m a #

(Applicative f, Monad f) => Applicative (WhenMissing f x)

Equivalent to ReaderT k (ReaderT x (MaybeT f)).

Since: containers-0.5.9

Instance details

Defined in Data.IntMap.Internal

Methods

pure :: a -> WhenMissing f x a #

(<*>) :: WhenMissing f x (a -> b) -> WhenMissing f x a -> WhenMissing f x b #

liftA2 :: (a -> b -> c) -> WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x c #

(*>) :: WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x b #

(<*) :: WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x a #

Monad m => Applicative (ExceptRT r m) 
Instance details

Defined in Data.EitherR

Methods

pure :: a -> ExceptRT r m a #

(<*>) :: ExceptRT r m (a -> b) -> ExceptRT r m a -> ExceptRT r m b #

liftA2 :: (a -> b -> c) -> ExceptRT r m a -> ExceptRT r m b -> ExceptRT r m c #

(*>) :: ExceptRT r m a -> ExceptRT r m b -> ExceptRT r m b #

(<*) :: ExceptRT r m a -> ExceptRT r m b -> ExceptRT r m a #

(Functor f, Monad m) => Applicative (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

pure :: a -> FreeT f m a #

(<*>) :: FreeT f m (a -> b) -> FreeT f m a -> FreeT f m b #

liftA2 :: (a -> b -> c) -> FreeT f m a -> FreeT f m b -> FreeT f m c #

(*>) :: FreeT f m a -> FreeT f m b -> FreeT f m b #

(<*) :: FreeT f m a -> FreeT f m b -> FreeT f m a #

(Applicative f, Applicative g) => Applicative (Day f g) 
Instance details

Defined in Data.Functor.Day

Methods

pure :: a -> Day f g a #

(<*>) :: Day f g (a -> b) -> Day f g a -> Day f g b #

liftA2 :: (a -> b -> c) -> Day f g a -> Day f g b -> Day f g c #

(*>) :: Day f g a -> Day f g b -> Day f g b #

(<*) :: Day f g a -> Day f g b -> Day f g a #

Applicative (Bazaar a b) 
Instance details

Defined in Lens.Micro

Methods

pure :: a0 -> Bazaar a b a0 #

(<*>) :: Bazaar a b (a0 -> b0) -> Bazaar a b a0 -> Bazaar a b b0 #

liftA2 :: (a0 -> b0 -> c) -> Bazaar a b a0 -> Bazaar a b b0 -> Bazaar a b c #

(*>) :: Bazaar a b a0 -> Bazaar a b b0 -> Bazaar a b b0 #

(<*) :: Bazaar a b a0 -> Bazaar a b b0 -> Bazaar a b a0 #

(Functor m, Monad m) => Applicative (StateT s m) 
Instance details

Defined in Lens.Micro

Methods

pure :: a -> StateT s m a #

(<*>) :: StateT s m (a -> b) -> StateT s m a -> StateT s m b #

liftA2 :: (a -> b -> c) -> StateT s m a -> StateT s m b -> StateT s m c #

(*>) :: StateT s m a -> StateT s m b -> StateT s m b #

(<*) :: StateT s m a -> StateT s m b -> StateT s m a #

(Monad m, Monoid r) => Applicative (Effect m r) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

pure :: a -> Effect m r a #

(<*>) :: Effect m r (a -> b) -> Effect m r a -> Effect m r b #

liftA2 :: (a -> b -> c) -> Effect m r a -> Effect m r b -> Effect m r c #

(*>) :: Effect m r a -> Effect m r b -> Effect m r b #

(<*) :: Effect m r a -> Effect m r b -> Effect m r a #

(Monad m, Monoid s) => Applicative (Focusing m s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

pure :: a -> Focusing m s a #

(<*>) :: Focusing m s (a -> b) -> Focusing m s a -> Focusing m s b #

liftA2 :: (a -> b -> c) -> Focusing m s a -> Focusing m s b -> Focusing m s c #

(*>) :: Focusing m s a -> Focusing m s b -> Focusing m s b #

(<*) :: Focusing m s a -> Focusing m s b -> Focusing m s a #

Applicative (k (May s)) => Applicative (FocusingMay k s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

pure :: a -> FocusingMay k s a #

(<*>) :: FocusingMay k s (a -> b) -> FocusingMay k s a -> FocusingMay k s b #

liftA2 :: (a -> b -> c) -> FocusingMay k s a -> FocusingMay k s b -> FocusingMay k s c #

(*>) :: FocusingMay k s a -> FocusingMay k s b -> FocusingMay k s b #

(<*) :: FocusingMay k s a -> FocusingMay k s b -> FocusingMay k s a #

(Applicative (Rep p), Representable p) => Applicative (Prep p) 
Instance details

Defined in Data.Profunctor.Rep

Methods

pure :: a -> Prep p a #

(<*>) :: Prep p (a -> b) -> Prep p a -> Prep p b #

liftA2 :: (a -> b -> c) -> Prep p a -> Prep p b -> Prep p c #

(*>) :: Prep p a -> Prep p b -> Prep p b #

(<*) :: Prep p a -> Prep p b -> Prep p a #

Applicative f => Applicative (Static f a) 
Instance details

Defined in Data.Semigroupoid.Static

Methods

pure :: a0 -> Static f a a0 #

(<*>) :: Static f a (a0 -> b) -> Static f a a0 -> Static f a b #

liftA2 :: (a0 -> b -> c) -> Static f a a0 -> Static f a b -> Static f a c #

(*>) :: Static f a a0 -> Static f a b -> Static f a b #

(<*) :: Static f a a0 -> Static f a b -> Static f a a0 #

Applicative (Tagged s) 
Instance details

Defined in Data.Tagged

Methods

pure :: a -> Tagged s a #

(<*>) :: Tagged s (a -> b) -> Tagged s a -> Tagged s b #

liftA2 :: (a -> b -> c) -> Tagged s a -> Tagged s b -> Tagged s c #

(*>) :: Tagged s a -> Tagged s b -> Tagged s b #

(<*) :: Tagged s a -> Tagged s b -> Tagged s a #

Applicative f => Applicative (Backwards f)

Apply f-actions in the reverse order.

Instance details

Defined in Control.Applicative.Backwards

Methods

pure :: a -> Backwards f a #

(<*>) :: Backwards f (a -> b) -> Backwards f a -> Backwards f b #

liftA2 :: (a -> b -> c) -> Backwards f a -> Backwards f b -> Backwards f c #

(*>) :: Backwards f a -> Backwards f b -> Backwards f b #

(<*) :: Backwards f a -> Backwards f b -> Backwards f a #

(Monoid w, Functor m, Monad m) => Applicative (AccumT w m) 
Instance details

Defined in Control.Monad.Trans.Accum

Methods

pure :: a -> AccumT w m a #

(<*>) :: AccumT w m (a -> b) -> AccumT w m a -> AccumT w m b #

liftA2 :: (a -> b -> c) -> AccumT w m a -> AccumT w m b -> AccumT w m c #

(*>) :: AccumT w m a -> AccumT w m b -> AccumT w m b #

(<*) :: AccumT w m a -> AccumT w m b -> AccumT w m a #

(Functor m, Monad m) => Applicative (ErrorT e m) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

pure :: a -> ErrorT e m a #

(<*>) :: ErrorT e m (a -> b) -> ErrorT e m a -> ErrorT e m b #

liftA2 :: (a -> b -> c) -> ErrorT e m a -> ErrorT e m b -> ErrorT e m c #

(*>) :: ErrorT e m a -> ErrorT e m b -> ErrorT e m b #

(<*) :: ErrorT e m a -> ErrorT e m b -> ErrorT e m a #

(Functor m, Monad m) => Applicative (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

pure :: a -> ExceptT e m a #

(<*>) :: ExceptT e m (a -> b) -> ExceptT e m a -> ExceptT e m b #

liftA2 :: (a -> b -> c) -> ExceptT e m a -> ExceptT e m b -> ExceptT e m c #

(*>) :: ExceptT e m a -> ExceptT e m b -> ExceptT e m b #

(<*) :: ExceptT e m a -> ExceptT e m b -> ExceptT e m a #

Applicative m => Applicative (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

pure :: a -> IdentityT m a #

(<*>) :: IdentityT m (a -> b) -> IdentityT m a -> IdentityT m b #

liftA2 :: (a -> b -> c) -> IdentityT m a -> IdentityT m b -> IdentityT m c #

(*>) :: IdentityT m a -> IdentityT m b -> IdentityT m b #

(<*) :: IdentityT m a -> IdentityT m b -> IdentityT m a #

Applicative m => Applicative (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

pure :: a -> ReaderT r m a #

(<*>) :: ReaderT r m (a -> b) -> ReaderT r m a -> ReaderT r m b #

liftA2 :: (a -> b -> c) -> ReaderT r m a -> ReaderT r m b -> ReaderT r m c #

(*>) :: ReaderT r m a -> ReaderT r m b -> ReaderT r m b #

(<*) :: ReaderT r m a -> ReaderT r m b -> ReaderT r m a #

(Functor m, Monad m) => Applicative (SelectT r m) 
Instance details

Defined in Control.Monad.Trans.Select

Methods

pure :: a -> SelectT r m a #

(<*>) :: SelectT r m (a -> b) -> SelectT r m a -> SelectT r m b #

liftA2 :: (a -> b -> c) -> SelectT r m a -> SelectT r m b -> SelectT r m c #

(*>) :: SelectT r m a -> SelectT r m b -> SelectT r m b #

(<*) :: SelectT r m a -> SelectT r m b -> SelectT r m a #

(Functor m, Monad m) => Applicative (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Lazy

Methods

pure :: a -> StateT s m a #

(<*>) :: StateT s m (a -> b) -> StateT s m a -> StateT s m b #

liftA2 :: (a -> b -> c) -> StateT s m a -> StateT s m b -> StateT s m c #

(*>) :: StateT s m a -> StateT s m b -> StateT s m b #

(<*) :: StateT s m a -> StateT s m b -> StateT s m a #

(Functor m, Monad m) => Applicative (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

pure :: a -> StateT s m a #

(<*>) :: StateT s m (a -> b) -> StateT s m a -> StateT s m b #

liftA2 :: (a -> b -> c) -> StateT s m a -> StateT s m b -> StateT s m c #

(*>) :: StateT s m a -> StateT s m b -> StateT s m b #

(<*) :: StateT s m a -> StateT s m b -> StateT s m a #

(Functor m, Monad m) => Applicative (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.CPS

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.Lazy

Methods

pure :: a -> WriterT w m a #

(<*>) :: WriterT w m (a -> b) -> WriterT w m a -> WriterT w m b #

liftA2 :: (a -> b -> c) -> WriterT w m a -> WriterT w m b -> WriterT w m c #

(*>) :: WriterT w m a -> WriterT w m b -> WriterT w m b #

(<*) :: WriterT w m a -> WriterT w m b -> WriterT w m a #

(Monoid w, Applicative m) => Applicative (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

pure :: a -> WriterT w m a #

(<*>) :: WriterT w m (a -> b) -> WriterT w m a -> WriterT w m b #

liftA2 :: (a -> b -> c) -> WriterT w m a -> WriterT w m b -> WriterT w m c #

(*>) :: WriterT w m a -> WriterT w m b -> WriterT w m b #

(<*) :: WriterT w m a -> WriterT w m b -> WriterT w m a #

Monoid a => Applicative (Constant a :: Type -> Type) 
Instance details

Defined in Data.Functor.Constant

Methods

pure :: a0 -> Constant a a0 #

(<*>) :: Constant a (a0 -> b) -> Constant a a0 -> Constant a b #

liftA2 :: (a0 -> b -> c) -> Constant a a0 -> Constant a b -> Constant a c #

(*>) :: Constant a a0 -> Constant a b -> Constant a b #

(<*) :: Constant a a0 -> Constant a b -> Constant a a0 #

Applicative f => Applicative (Reverse f)

Derived instance.

Instance details

Defined in Data.Functor.Reverse

Methods

pure :: a -> Reverse f a #

(<*>) :: Reverse f (a -> b) -> Reverse f a -> Reverse f b #

liftA2 :: (a -> b -> c) -> Reverse f a -> Reverse f b -> Reverse f c #

(*>) :: Reverse f a -> Reverse f b -> Reverse f b #

(<*) :: Reverse f a -> Reverse f b -> Reverse f a #

Applicative (SubHandlerFor child master) 
Instance details

Defined in Yesod.Core.Types

Methods

pure :: a -> SubHandlerFor child master a #

(<*>) :: SubHandlerFor child master (a -> b) -> SubHandlerFor child master a -> SubHandlerFor child master b #

liftA2 :: (a -> b -> c) -> SubHandlerFor child master a -> SubHandlerFor child master b -> SubHandlerFor child master c #

(*>) :: SubHandlerFor child master a -> SubHandlerFor child master b -> SubHandlerFor child master b #

(<*) :: SubHandlerFor child master a -> SubHandlerFor child master b -> SubHandlerFor child master a #

(Monoid a, Monoid b) => Applicative ((,,) a b)

Since: base-4.14.0.0

Instance details

Defined in GHC.Base

Methods

pure :: a0 -> (a, b, a0) #

(<*>) :: (a, b, a0 -> b0) -> (a, b, a0) -> (a, b, b0) #

liftA2 :: (a0 -> b0 -> c) -> (a, b, a0) -> (a, b, b0) -> (a, b, c) #

(*>) :: (a, b, a0) -> (a, b, b0) -> (a, b, b0) #

(<*) :: (a, b, a0) -> (a, b, b0) -> (a, b, a0) #

(Applicative f, Applicative g) => Applicative (Product f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Product

Methods

pure :: a -> Product f g a #

(<*>) :: Product f g (a -> b) -> Product f g a -> Product f g b #

liftA2 :: (a -> b -> c) -> Product f g a -> Product f g b -> Product f g c #

(*>) :: Product f g a -> Product f g b -> Product f g b #

(<*) :: Product f g a -> Product f g b -> Product f g a #

(Applicative f, Applicative g) => Applicative (f :*: g)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

pure :: a -> (f :*: g) a #

(<*>) :: (f :*: g) (a -> b) -> (f :*: g) a -> (f :*: g) b #

liftA2 :: (a -> b -> c) -> (f :*: g) a -> (f :*: g) b -> (f :*: g) c #

(*>) :: (f :*: g) a -> (f :*: g) b -> (f :*: g) b #

(<*) :: (f :*: g) a -> (f :*: g) b -> (f :*: g) a #

Monoid c => Applicative (K1 i c :: Type -> Type)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

pure :: a -> K1 i c a #

(<*>) :: K1 i c (a -> b) -> K1 i c a -> K1 i c b #

liftA2 :: (a -> b -> c0) -> K1 i c a -> K1 i c b -> K1 i c c0 #

(*>) :: K1 i c a -> K1 i c b -> K1 i c b #

(<*) :: K1 i c a -> K1 i c b -> K1 i c a #

Applicative (Cokleisli w a) 
Instance details

Defined in Control.Comonad

Methods

pure :: a0 -> Cokleisli w a a0 #

(<*>) :: Cokleisli w a (a0 -> b) -> Cokleisli w a a0 -> Cokleisli w a b #

liftA2 :: (a0 -> b -> c) -> Cokleisli w a a0 -> Cokleisli w a b -> Cokleisli w a c #

(*>) :: Cokleisli w a a0 -> Cokleisli w a b -> Cokleisli w a b #

(<*) :: Cokleisli w a a0 -> Cokleisli w a b -> Cokleisli w a a0 #

Applicative (ConduitT i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

pure :: a -> ConduitT i o m a #

(<*>) :: ConduitT i o m (a -> b) -> ConduitT i o m a -> ConduitT i o m b #

liftA2 :: (a -> b -> c) -> ConduitT i o m a -> ConduitT i o m b -> ConduitT i o m c #

(*>) :: ConduitT i o m a -> ConduitT i o m b -> ConduitT i o m b #

(<*) :: ConduitT i o m a -> ConduitT i o m b -> ConduitT i o m a #

Monad m => Applicative (ZipConduit i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

pure :: a -> ZipConduit i o m a #

(<*>) :: ZipConduit i o m (a -> b) -> ZipConduit i o m a -> ZipConduit i o m b #

liftA2 :: (a -> b -> c) -> ZipConduit i o m a -> ZipConduit i o m b -> ZipConduit i o m c #

(*>) :: ZipConduit i o m a -> ZipConduit i o m b -> ZipConduit i o m b #

(<*) :: ZipConduit i o m a -> ZipConduit i o m b -> ZipConduit i o m a #

(Monad f, Applicative f) => Applicative (WhenMatched f x y)

Equivalent to ReaderT Key (ReaderT x (ReaderT y (MaybeT f)))

Since: containers-0.5.9

Instance details

Defined in Data.IntMap.Internal

Methods

pure :: a -> WhenMatched f x y a #

(<*>) :: WhenMatched f x y (a -> b) -> WhenMatched f x y a -> WhenMatched f x y b #

liftA2 :: (a -> b -> c) -> WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y c #

(*>) :: WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y b #

(<*) :: WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y a #

(Applicative f, Monad f) => Applicative (WhenMissing f k x)

Equivalent to ReaderT k (ReaderT x (MaybeT f)) .

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

pure :: a -> WhenMissing f k x a #

(<*>) :: WhenMissing f k x (a -> b) -> WhenMissing f k x a -> WhenMissing f k x b #

liftA2 :: (a -> b -> c) -> WhenMissing f k x a -> WhenMissing f k x b -> WhenMissing f k x c #

(*>) :: WhenMissing f k x a -> WhenMissing f k x b -> WhenMissing f k x b #

(<*) :: WhenMissing f k x a -> WhenMissing f k x b -> WhenMissing f k x a #

Applicative (k (Err e s)) => Applicative (FocusingErr e k s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

pure :: a -> FocusingErr e k s a #

(<*>) :: FocusingErr e k s (a -> b) -> FocusingErr e k s a -> FocusingErr e k s b #

liftA2 :: (a -> b -> c) -> FocusingErr e k s a -> FocusingErr e k s b -> FocusingErr e k s c #

(*>) :: FocusingErr e k s a -> FocusingErr e k s b -> FocusingErr e k s b #

(<*) :: FocusingErr e k s a -> FocusingErr e k s b -> FocusingErr e k s a #

Applicative (k (f s)) => Applicative (FocusingOn f k s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

pure :: a -> FocusingOn f k s a #

(<*>) :: FocusingOn f k s (a -> b) -> FocusingOn f k s a -> FocusingOn f k s b #

liftA2 :: (a -> b -> c) -> FocusingOn f k s a -> FocusingOn f k s b -> FocusingOn f k s c #

(*>) :: FocusingOn f k s a -> FocusingOn f k s b -> FocusingOn f k s b #

(<*) :: FocusingOn f k s a -> FocusingOn f k s b -> FocusingOn f k s a #

Applicative (k (s, w)) => Applicative (FocusingPlus w k s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

pure :: a -> FocusingPlus w k s a #

(<*>) :: FocusingPlus w k s (a -> b) -> FocusingPlus w k s a -> FocusingPlus w k s b #

liftA2 :: (a -> b -> c) -> FocusingPlus w k s a -> FocusingPlus w k s b -> FocusingPlus w k s c #

(*>) :: FocusingPlus w k s a -> FocusingPlus w k s b -> FocusingPlus w k s b #

(<*) :: FocusingPlus w k s a -> FocusingPlus w k s b -> FocusingPlus w k s a #

(Monad m, Monoid s, Monoid w) => Applicative (FocusingWith w m s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

pure :: a -> FocusingWith w m s a #

(<*>) :: FocusingWith w m s (a -> b) -> FocusingWith w m s a -> FocusingWith w m s b #

liftA2 :: (a -> b -> c) -> FocusingWith w m s a -> FocusingWith w m s b -> FocusingWith w m s c #

(*>) :: FocusingWith w m s a -> FocusingWith w m s b -> FocusingWith w m s b #

(<*) :: FocusingWith w m s a -> FocusingWith w m s b -> FocusingWith w m s a #

Applicative (ContT r m) 
Instance details

Defined in Control.Monad.Trans.Cont

Methods

pure :: a -> ContT r m a #

(<*>) :: ContT r m (a -> b) -> ContT r m a -> ContT r m b #

liftA2 :: (a -> b -> c) -> ContT r m a -> ContT r m b -> ContT r m c #

(*>) :: ContT r m a -> ContT r m b -> ContT r m b #

(<*) :: ContT r m a -> ContT r m b -> ContT r m a #

(Monoid a, Monoid b, Monoid c) => Applicative ((,,,) a b c)

Since: base-4.14.0.0

Instance details

Defined in GHC.Base

Methods

pure :: a0 -> (a, b, c, a0) #

(<*>) :: (a, b, c, a0 -> b0) -> (a, b, c, a0) -> (a, b, c, b0) #

liftA2 :: (a0 -> b0 -> c0) -> (a, b, c, a0) -> (a, b, c, b0) -> (a, b, c, c0) #

(*>) :: (a, b, c, a0) -> (a, b, c, b0) -> (a, b, c, b0) #

(<*) :: (a, b, c, a0) -> (a, b, c, b0) -> (a, b, c, a0) #

Applicative ((->) r)

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

pure :: a -> r -> a #

(<*>) :: (r -> (a -> b)) -> (r -> a) -> r -> b #

liftA2 :: (a -> b -> c) -> (r -> a) -> (r -> b) -> r -> c #

(*>) :: (r -> a) -> (r -> b) -> r -> b #

(<*) :: (r -> a) -> (r -> b) -> r -> a #

(Applicative f, Applicative g) => Applicative (Compose f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

pure :: a -> Compose f g a #

(<*>) :: Compose f g (a -> b) -> Compose f g a -> Compose f g b #

liftA2 :: (a -> b -> c) -> Compose f g a -> Compose f g b -> Compose f g c #

(*>) :: Compose f g a -> Compose f g b -> Compose f g b #

(<*) :: Compose f g a -> Compose f g b -> Compose f g a #

(Applicative f, Applicative g) => Applicative (f :.: g)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

pure :: a -> (f :.: g) a #

(<*>) :: (f :.: g) (a -> b) -> (f :.: g) a -> (f :.: g) b #

liftA2 :: (a -> b -> c) -> (f :.: g) a -> (f :.: g) b -> (f :.: g) c #

(*>) :: (f :.: g) a -> (f :.: g) b -> (f :.: g) b #

(<*) :: (f :.: g) a -> (f :.: g) b -> (f :.: g) a #

Applicative f => Applicative (M1 i c f)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

pure :: a -> M1 i c f a #

(<*>) :: M1 i c f (a -> b) -> M1 i c f a -> M1 i c f b #

liftA2 :: (a -> b -> c0) -> M1 i c f a -> M1 i c f b -> M1 i c f c0 #

(*>) :: M1 i c f a -> M1 i c f b -> M1 i c f b #

(<*) :: M1 i c f a -> M1 i c f b -> M1 i c f a #

(Monad f, Applicative f) => Applicative (WhenMatched f k x y)

Equivalent to ReaderT k (ReaderT x (ReaderT y (MaybeT f)))

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

pure :: a -> WhenMatched f k x y a #

(<*>) :: WhenMatched f k x y (a -> b) -> WhenMatched f k x y a -> WhenMatched f k x y b #

liftA2 :: (a -> b -> c) -> WhenMatched f k x y a -> WhenMatched f k x y b -> WhenMatched f k x y c #

(*>) :: WhenMatched f k x y a -> WhenMatched f k x y b -> WhenMatched f k x y b #

(<*) :: WhenMatched f k x y a -> WhenMatched f k x y b -> WhenMatched f k x y a #

(Monoid s, Monoid w, Monad m) => Applicative (EffectRWS w st m s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

pure :: a -> EffectRWS w st m s a #

(<*>) :: EffectRWS w st m s (a -> b) -> EffectRWS w st m s a -> EffectRWS w st m s b #

liftA2 :: (a -> b -> c) -> EffectRWS w st m s a -> EffectRWS w st m s b -> EffectRWS w st m s c #

(*>) :: EffectRWS w st m s a -> EffectRWS w st m s b -> EffectRWS w st m s b #

(<*) :: EffectRWS w st m s a -> EffectRWS w st m s b -> EffectRWS w st m s a #

(Functor m, Monad m) => Applicative (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.CPS

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.Lazy

Methods

pure :: a -> RWST r w s m a #

(<*>) :: RWST r w s m (a -> b) -> RWST r w s m a -> RWST r w s m b #

liftA2 :: (a -> b -> c) -> RWST r w s m a -> RWST r w s m b -> RWST r w s m c #

(*>) :: RWST r w s m a -> RWST r w s m b -> RWST r w s m b #

(<*) :: RWST r w s m a -> RWST r w s m b -> RWST r w s m a #

(Monoid w, Functor m, Monad m) => Applicative (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.Strict

Methods

pure :: a -> RWST r w s m a #

(<*>) :: RWST r w s m (a -> b) -> RWST r w s m a -> RWST r w s m b #

liftA2 :: (a -> b -> c) -> RWST r w s m a -> RWST r w s m b -> RWST r w s m c #

(*>) :: RWST r w s m a -> RWST r w s m b -> RWST r w s m b #

(<*) :: RWST r w s m a -> RWST r w s m b -> RWST r w s m a #

Monad state => Applicative (Builder collection mutCollection step state err) 
Instance details

Defined in Basement.MutableBuilder

Methods

pure :: a -> Builder collection mutCollection step state err a #

(<*>) :: Builder collection mutCollection step state err (a -> b) -> Builder collection mutCollection step state err a -> Builder collection mutCollection step state err b #

liftA2 :: (a -> b -> c) -> Builder collection mutCollection step state err a -> Builder collection mutCollection step state err b -> Builder collection mutCollection step state err c #

(*>) :: Builder collection mutCollection step state err a -> Builder collection mutCollection step state err b -> Builder collection mutCollection step state err b #

(<*) :: Builder collection mutCollection step state err a -> Builder collection mutCollection step state err b -> Builder collection mutCollection step state err a #

Monad m => Applicative (Pipe l i o u m) 
Instance details

Defined in Data.Conduit.Internal.Pipe

Methods

pure :: a -> Pipe l i o u m a #

(<*>) :: Pipe l i o u m (a -> b) -> Pipe l i o u m a -> Pipe l i o u m b #

liftA2 :: (a -> b -> c) -> Pipe l i o u m a -> Pipe l i o u m b -> Pipe l i o u m c #

(*>) :: Pipe l i o u m a -> Pipe l i o u m b -> Pipe l i o u m b #

(<*) :: Pipe l i o u m a -> Pipe l i o u m b -> Pipe l i o u m a #

class Foldable (t :: Type -> Type) #

The Foldable class represents data structures that can be reduced to a summary value one element at a time. Strict left-associative folds are a good fit for space-efficient reduction, while lazy right-associative folds are a good fit for corecursive iteration, or for folds that short-circuit after processing an initial subsequence of the structure's elements.

Instances can be derived automatically by enabling the DeriveFoldable extension. For example, a derived instance for a binary tree might be:

{-# LANGUAGE DeriveFoldable #-}
data Tree a = Empty
            | Leaf a
            | Node (Tree a) a (Tree a)
    deriving Foldable

A more detailed description can be found in the Overview section of Data.Foldable.

For the class laws see the Laws section of Data.Foldable.

Minimal complete definition

foldMap | foldr

Instances

Instances details
Foldable IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fold :: Monoid m => IResult m -> m #

foldMap :: Monoid m => (a -> m) -> IResult a -> m #

foldMap' :: Monoid m => (a -> m) -> IResult a -> m #

foldr :: (a -> b -> b) -> b -> IResult a -> b #

foldr' :: (a -> b -> b) -> b -> IResult a -> b #

foldl :: (b -> a -> b) -> b -> IResult a -> b #

foldl' :: (b -> a -> b) -> b -> IResult a -> b #

foldr1 :: (a -> a -> a) -> IResult a -> a #

foldl1 :: (a -> a -> a) -> IResult a -> a #

toList :: IResult a -> [a] #

null :: IResult a -> Bool #

length :: IResult a -> Int #

elem :: Eq a => a -> IResult a -> Bool #

maximum :: Ord a => IResult a -> a #

minimum :: Ord a => IResult a -> a #

sum :: Num a => IResult a -> a #

product :: Num a => IResult a -> a #

Foldable Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fold :: Monoid m => Result m -> m #

foldMap :: Monoid m => (a -> m) -> Result a -> m #

foldMap' :: Monoid m => (a -> m) -> Result a -> m #

foldr :: (a -> b -> b) -> b -> Result a -> b #

foldr' :: (a -> b -> b) -> b -> Result a -> b #

foldl :: (b -> a -> b) -> b -> Result a -> b #

foldl' :: (b -> a -> b) -> b -> Result a -> b #

foldr1 :: (a -> a -> a) -> Result a -> a #

foldl1 :: (a -> a -> a) -> Result a -> a #

toList :: Result a -> [a] #

null :: Result a -> Bool #

length :: Result a -> Int #

elem :: Eq a => a -> Result a -> Bool #

maximum :: Ord a => Result a -> a #

minimum :: Ord a => Result a -> a #

sum :: Num a => Result a -> a #

product :: Num a => Result a -> a #

Foldable ZipList

Since: base-4.9.0.0

Instance details

Defined in Control.Applicative

Methods

fold :: Monoid m => ZipList m -> m #

foldMap :: Monoid m => (a -> m) -> ZipList a -> m #

foldMap' :: Monoid m => (a -> m) -> ZipList a -> m #

foldr :: (a -> b -> b) -> b -> ZipList a -> b #

foldr' :: (a -> b -> b) -> b -> ZipList a -> b #

foldl :: (b -> a -> b) -> b -> ZipList a -> b #

foldl' :: (b -> a -> b) -> b -> ZipList a -> b #

foldr1 :: (a -> a -> a) -> ZipList a -> a #

foldl1 :: (a -> a -> a) -> ZipList a -> a #

toList :: ZipList a -> [a] #

null :: ZipList a -> Bool #

length :: ZipList a -> Int #

elem :: Eq a => a -> ZipList a -> Bool #

maximum :: Ord a => ZipList a -> a #

minimum :: Ord a => ZipList a -> a #

sum :: Num a => ZipList a -> a #

product :: Num a => ZipList a -> a #

Foldable Complex

Since: base-4.9.0.0

Instance details

Defined in Data.Complex

Methods

fold :: Monoid m => Complex m -> m #

foldMap :: Monoid m => (a -> m) -> Complex a -> m #

foldMap' :: Monoid m => (a -> m) -> Complex a -> m #

foldr :: (a -> b -> b) -> b -> Complex a -> b #

foldr' :: (a -> b -> b) -> b -> Complex a -> b #

foldl :: (b -> a -> b) -> b -> Complex a -> b #

foldl' :: (b -> a -> b) -> b -> Complex a -> b #

foldr1 :: (a -> a -> a) -> Complex a -> a #

foldl1 :: (a -> a -> a) -> Complex a -> a #

toList :: Complex a -> [a] #

null :: Complex a -> Bool #

length :: Complex a -> Int #

elem :: Eq a => a -> Complex a -> Bool #

maximum :: Ord a => Complex a -> a #

minimum :: Ord a => Complex a -> a #

sum :: Num a => Complex a -> a #

product :: Num a => Complex a -> a #

Foldable Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

fold :: Monoid m => Identity m -> m #

foldMap :: Monoid m => (a -> m) -> Identity a -> m #

foldMap' :: Monoid m => (a -> m) -> Identity a -> m #

foldr :: (a -> b -> b) -> b -> Identity a -> b #

foldr' :: (a -> b -> b) -> b -> Identity a -> b #

foldl :: (b -> a -> b) -> b -> Identity a -> b #

foldl' :: (b -> a -> b) -> b -> Identity a -> b #

foldr1 :: (a -> a -> a) -> Identity a -> a #

foldl1 :: (a -> a -> a) -> Identity a -> a #

toList :: Identity a -> [a] #

null :: Identity a -> Bool #

length :: Identity a -> Int #

elem :: Eq a => a -> Identity a -> Bool #

maximum :: Ord a => Identity a -> a #

minimum :: Ord a => Identity a -> a #

sum :: Num a => Identity a -> a #

product :: Num a => Identity a -> a #

Foldable First

Since: base-4.8.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => First m -> m #

foldMap :: Monoid m => (a -> m) -> First a -> m #

foldMap' :: Monoid m => (a -> m) -> First a -> m #

foldr :: (a -> b -> b) -> b -> First a -> b #

foldr' :: (a -> b -> b) -> b -> First a -> b #

foldl :: (b -> a -> b) -> b -> First a -> b #

foldl' :: (b -> a -> b) -> b -> First a -> b #

foldr1 :: (a -> a -> a) -> First a -> a #

foldl1 :: (a -> a -> a) -> First a -> a #

toList :: First a -> [a] #

null :: First a -> Bool #

length :: First a -> Int #

elem :: Eq a => a -> First a -> Bool #

maximum :: Ord a => First a -> a #

minimum :: Ord a => First a -> a #

sum :: Num a => First a -> a #

product :: Num a => First a -> a #

Foldable Last

Since: base-4.8.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Last m -> m #

foldMap :: Monoid m => (a -> m) -> Last a -> m #

foldMap' :: Monoid m => (a -> m) -> Last a -> m #

foldr :: (a -> b -> b) -> b -> Last a -> b #

foldr' :: (a -> b -> b) -> b -> Last a -> b #

foldl :: (b -> a -> b) -> b -> Last a -> b #

foldl' :: (b -> a -> b) -> b -> Last a -> b #

foldr1 :: (a -> a -> a) -> Last a -> a #

foldl1 :: (a -> a -> a) -> Last a -> a #

toList :: Last a -> [a] #

null :: Last a -> Bool #

length :: Last a -> Int #

elem :: Eq a => a -> Last a -> Bool #

maximum :: Ord a => Last a -> a #

minimum :: Ord a => Last a -> a #

sum :: Num a => Last a -> a #

product :: Num a => Last a -> a #

Foldable Down

Since: base-4.12.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Down m -> m #

foldMap :: Monoid m => (a -> m) -> Down a -> m #

foldMap' :: Monoid m => (a -> m) -> Down a -> m #

foldr :: (a -> b -> b) -> b -> Down a -> b #

foldr' :: (a -> b -> b) -> b -> Down a -> b #

foldl :: (b -> a -> b) -> b -> Down a -> b #

foldl' :: (b -> a -> b) -> b -> Down a -> b #

foldr1 :: (a -> a -> a) -> Down a -> a #

foldl1 :: (a -> a -> a) -> Down a -> a #

toList :: Down a -> [a] #

null :: Down a -> Bool #

length :: Down a -> Int #

elem :: Eq a => a -> Down a -> Bool #

maximum :: Ord a => Down a -> a #

minimum :: Ord a => Down a -> a #

sum :: Num a => Down a -> a #

product :: Num a => Down a -> a #

Foldable First

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

fold :: Monoid m => First m -> m #

foldMap :: Monoid m => (a -> m) -> First a -> m #

foldMap' :: Monoid m => (a -> m) -> First a -> m #

foldr :: (a -> b -> b) -> b -> First a -> b #

foldr' :: (a -> b -> b) -> b -> First a -> b #

foldl :: (b -> a -> b) -> b -> First a -> b #

foldl' :: (b -> a -> b) -> b -> First a -> b #

foldr1 :: (a -> a -> a) -> First a -> a #

foldl1 :: (a -> a -> a) -> First a -> a #

toList :: First a -> [a] #

null :: First a -> Bool #

length :: First a -> Int #

elem :: Eq a => a -> First a -> Bool #

maximum :: Ord a => First a -> a #

minimum :: Ord a => First a -> a #

sum :: Num a => First a -> a #

product :: Num a => First a -> a #

Foldable Last

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

fold :: Monoid m => Last m -> m #

foldMap :: Monoid m => (a -> m) -> Last a -> m #

foldMap' :: Monoid m => (a -> m) -> Last a -> m #

foldr :: (a -> b -> b) -> b -> Last a -> b #

foldr' :: (a -> b -> b) -> b -> Last a -> b #

foldl :: (b -> a -> b) -> b -> Last a -> b #

foldl' :: (b -> a -> b) -> b -> Last a -> b #

foldr1 :: (a -> a -> a) -> Last a -> a #

foldl1 :: (a -> a -> a) -> Last a -> a #

toList :: Last a -> [a] #

null :: Last a -> Bool #

length :: Last a -> Int #

elem :: Eq a => a -> Last a -> Bool #

maximum :: Ord a => Last a -> a #

minimum :: Ord a => Last a -> a #

sum :: Num a => Last a -> a #

product :: Num a => Last a -> a #

Foldable Max

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

fold :: Monoid m => Max m -> m #

foldMap :: Monoid m => (a -> m) -> Max a -> m #

foldMap' :: Monoid m => (a -> m) -> Max a -> m #

foldr :: (a -> b -> b) -> b -> Max a -> b #

foldr' :: (a -> b -> b) -> b -> Max a -> b #

foldl :: (b -> a -> b) -> b -> Max a -> b #

foldl' :: (b -> a -> b) -> b -> Max a -> b #

foldr1 :: (a -> a -> a) -> Max a -> a #

foldl1 :: (a -> a -> a) -> Max a -> a #

toList :: Max a -> [a] #

null :: Max a -> Bool #

length :: Max a -> Int #

elem :: Eq a => a -> Max a -> Bool #

maximum :: Ord a => Max a -> a #

minimum :: Ord a => Max a -> a #

sum :: Num a => Max a -> a #

product :: Num a => Max a -> a #

Foldable Min

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

fold :: Monoid m => Min m -> m #

foldMap :: Monoid m => (a -> m) -> Min a -> m #

foldMap' :: Monoid m => (a -> m) -> Min a -> m #

foldr :: (a -> b -> b) -> b -> Min a -> b #

foldr' :: (a -> b -> b) -> b -> Min a -> b #

foldl :: (b -> a -> b) -> b -> Min a -> b #

foldl' :: (b -> a -> b) -> b -> Min a -> b #

foldr1 :: (a -> a -> a) -> Min a -> a #

foldl1 :: (a -> a -> a) -> Min a -> a #

toList :: Min a -> [a] #

null :: Min a -> Bool #

length :: Min a -> Int #

elem :: Eq a => a -> Min a -> Bool #

maximum :: Ord a => Min a -> a #

minimum :: Ord a => Min a -> a #

sum :: Num a => Min a -> a #

product :: Num a => Min a -> a #

Foldable 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 #

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 Dual

Since: base-4.8.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Dual m -> m #

foldMap :: Monoid m => (a -> m) -> Dual a -> m #

foldMap' :: Monoid m => (a -> m) -> Dual a -> m #

foldr :: (a -> b -> b) -> b -> Dual a -> b #

foldr' :: (a -> b -> b) -> b -> Dual a -> b #

foldl :: (b -> a -> b) -> b -> Dual a -> b #

foldl' :: (b -> a -> b) -> b -> Dual a -> b #

foldr1 :: (a -> a -> a) -> Dual a -> a #

foldl1 :: (a -> a -> a) -> Dual a -> a #

toList :: Dual a -> [a] #

null :: Dual a -> Bool #

length :: Dual a -> Int #

elem :: Eq a => a -> Dual a -> Bool #

maximum :: Ord a => Dual a -> a #

minimum :: Ord a => Dual a -> a #

sum :: Num a => Dual a -> a #

product :: Num a => Dual a -> a #

Foldable Product

Since: base-4.8.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Product m -> m #

foldMap :: Monoid m => (a -> m) -> Product a -> m #

foldMap' :: Monoid m => (a -> m) -> Product a -> m #

foldr :: (a -> b -> b) -> b -> Product a -> b #

foldr' :: (a -> b -> b) -> b -> Product a -> b #

foldl :: (b -> a -> b) -> b -> Product a -> b #

foldl' :: (b -> a -> b) -> b -> Product a -> b #

foldr1 :: (a -> a -> a) -> Product a -> a #

foldl1 :: (a -> a -> a) -> Product a -> a #

toList :: Product a -> [a] #

null :: Product a -> Bool #

length :: Product a -> Int #

elem :: Eq a => a -> Product a -> Bool #

maximum :: Ord a => Product a -> a #

minimum :: Ord a => Product a -> a #

sum :: Num a => Product a -> a #

product :: Num a => Product a -> a #

Foldable Sum

Since: base-4.8.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Sum m -> m #

foldMap :: Monoid m => (a -> m) -> Sum a -> m #

foldMap' :: Monoid m => (a -> m) -> Sum a -> m #

foldr :: (a -> b -> b) -> b -> Sum a -> b #

foldr' :: (a -> b -> b) -> b -> Sum a -> b #

foldl :: (b -> a -> b) -> b -> Sum a -> b #

foldl' :: (b -> a -> b) -> b -> Sum a -> b #

foldr1 :: (a -> a -> a) -> Sum a -> a #

foldl1 :: (a -> a -> a) -> Sum a -> a #

toList :: Sum a -> [a] #

null :: Sum a -> Bool #

length :: Sum a -> Int #

elem :: Eq a => a -> Sum a -> Bool #

maximum :: Ord a => Sum a -> a #

minimum :: Ord a => Sum a -> a #

sum :: Num a => Sum a -> a #

product :: Num a => Sum a -> a #

Foldable NonEmpty

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => NonEmpty m -> m #

foldMap :: Monoid m => (a -> m) -> NonEmpty a -> m #

foldMap' :: Monoid m => (a -> m) -> NonEmpty a -> m #

foldr :: (a -> b -> b) -> b -> NonEmpty a -> b #

foldr' :: (a -> b -> b) -> b -> NonEmpty a -> b #

foldl :: (b -> a -> b) -> b -> NonEmpty a -> b #

foldl' :: (b -> a -> b) -> b -> NonEmpty a -> b #

foldr1 :: (a -> a -> a) -> NonEmpty a -> a #

foldl1 :: (a -> a -> a) -> NonEmpty a -> a #

toList :: NonEmpty a -> [a] #

null :: NonEmpty a -> Bool #

length :: NonEmpty a -> Int #

elem :: Eq a => a -> NonEmpty a -> Bool #

maximum :: Ord a => NonEmpty a -> a #

minimum :: Ord a => NonEmpty a -> a #

sum :: Num a => NonEmpty a -> a #

product :: Num a => NonEmpty a -> a #

Foldable Par1

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Par1 m -> m #

foldMap :: Monoid m => (a -> m) -> Par1 a -> m #

foldMap' :: Monoid m => (a -> m) -> Par1 a -> m #

foldr :: (a -> b -> b) -> b -> Par1 a -> b #

foldr' :: (a -> b -> b) -> b -> Par1 a -> b #

foldl :: (b -> a -> b) -> b -> Par1 a -> b #

foldl' :: (b -> a -> b) -> b -> Par1 a -> b #

foldr1 :: (a -> a -> a) -> Par1 a -> a #

foldl1 :: (a -> a -> a) -> Par1 a -> a #

toList :: Par1 a -> [a] #

null :: Par1 a -> Bool #

length :: Par1 a -> Int #

elem :: Eq a => a -> Par1 a -> Bool #

maximum :: Ord a => Par1 a -> a #

minimum :: Ord a => Par1 a -> a #

sum :: Num a => Par1 a -> a #

product :: Num a => Par1 a -> a #

Foldable Identifier 
Instance details

Defined in Text.Casing

Methods

fold :: Monoid m => Identifier m -> m #

foldMap :: Monoid m => (a -> m) -> Identifier a -> m #

foldMap' :: Monoid m => (a -> m) -> Identifier a -> m #

foldr :: (a -> b -> b) -> b -> Identifier a -> b #

foldr' :: (a -> b -> b) -> b -> Identifier a -> b #

foldl :: (b -> a -> b) -> b -> Identifier a -> b #

foldl' :: (b -> a -> b) -> b -> Identifier a -> b #

foldr1 :: (a -> a -> a) -> Identifier a -> a #

foldl1 :: (a -> a -> a) -> Identifier a -> a #

toList :: Identifier a -> [a] #

null :: Identifier a -> Bool #

length :: Identifier a -> Int #

elem :: Eq a => a -> Identifier a -> Bool #

maximum :: Ord a => Identifier a -> a #

minimum :: Ord a => Identifier a -> a #

sum :: Num a => Identifier a -> a #

product :: Num a => Identifier a -> a #

Foldable IntMap

Folds in order of increasing key.

Instance details

Defined in Data.IntMap.Internal

Methods

fold :: Monoid m => IntMap m -> m #

foldMap :: Monoid m => (a -> m) -> IntMap a -> m #

foldMap' :: Monoid m => (a -> m) -> IntMap a -> m #

foldr :: (a -> b -> b) -> b -> IntMap a -> b #

foldr' :: (a -> b -> b) -> b -> IntMap a -> b #

foldl :: (b -> a -> b) -> b -> IntMap a -> b #

foldl' :: (b -> a -> b) -> b -> IntMap a -> b #

foldr1 :: (a -> a -> a) -> IntMap a -> a #

foldl1 :: (a -> a -> a) -> IntMap a -> a #

toList :: IntMap a -> [a] #

null :: IntMap a -> Bool #

length :: IntMap a -> Int #

elem :: Eq a => a -> IntMap a -> Bool #

maximum :: Ord a => IntMap a -> a #

minimum :: Ord a => IntMap a -> a #

sum :: Num a => IntMap a -> a #

product :: Num a => IntMap a -> a #

Foldable Digit 
Instance details

Defined in Data.Sequence.Internal

Methods

fold :: Monoid m => Digit m -> m #

foldMap :: Monoid m => (a -> m) -> Digit a -> m #

foldMap' :: Monoid m => (a -> m) -> Digit a -> m #

foldr :: (a -> b -> b) -> b -> Digit a -> b #

foldr' :: (a -> b -> b) -> b -> Digit a -> b #

foldl :: (b -> a -> b) -> b -> Digit a -> b #

foldl' :: (b -> a -> b) -> b -> Digit a -> b #

foldr1 :: (a -> a -> a) -> Digit a -> a #

foldl1 :: (a -> a -> a) -> Digit a -> a #

toList :: Digit a -> [a] #

null :: Digit a -> Bool #

length :: Digit a -> Int #

elem :: Eq a => a -> Digit a -> Bool #

maximum :: Ord a => Digit a -> a #

minimum :: Ord a => Digit a -> a #

sum :: Num a => Digit a -> a #

product :: Num a => Digit a -> a #

Foldable Elem 
Instance details

Defined in Data.Sequence.Internal

Methods

fold :: Monoid m => Elem m -> m #

foldMap :: Monoid m => (a -> m) -> Elem a -> m #

foldMap' :: Monoid m => (a -> m) -> Elem a -> m #

foldr :: (a -> b -> b) -> b -> Elem a -> b #

foldr' :: (a -> b -> b) -> b -> Elem a -> b #

foldl :: (b -> a -> b) -> b -> Elem a -> b #

foldl' :: (b -> a -> b) -> b -> Elem a -> b #

foldr1 :: (a -> a -> a) -> Elem a -> a #

foldl1 :: (a -> a -> a) -> Elem a -> a #

toList :: Elem a -> [a] #

null :: Elem a -> Bool #

length :: Elem a -> Int #

elem :: Eq a => a -> Elem a -> Bool #

maximum :: Ord a => Elem a -> a #

minimum :: Ord a => Elem a -> a #

sum :: Num a => Elem a -> a #

product :: Num a => Elem a -> a #

Foldable FingerTree 
Instance details

Defined in Data.Sequence.Internal

Methods

fold :: Monoid m => FingerTree m -> m #

foldMap :: Monoid m => (a -> m) -> FingerTree a -> m #

foldMap' :: Monoid m => (a -> m) -> FingerTree a -> m #

foldr :: (a -> b -> b) -> b -> FingerTree a -> b #

foldr' :: (a -> b -> b) -> b -> FingerTree a -> b #

foldl :: (b -> a -> b) -> b -> FingerTree a -> b #

foldl' :: (b -> a -> b) -> b -> FingerTree a -> b #

foldr1 :: (a -> a -> a) -> FingerTree a -> a #

foldl1 :: (a -> a -> a) -> FingerTree a -> a #

toList :: FingerTree a -> [a] #

null :: FingerTree a -> Bool #

length :: FingerTree a -> Int #

elem :: Eq a => a -> FingerTree a -> Bool #

maximum :: Ord a => FingerTree a -> a #

minimum :: Ord a => FingerTree a -> a #

sum :: Num a => FingerTree a -> a #

product :: Num a => FingerTree a -> a #

Foldable Node 
Instance details

Defined in Data.Sequence.Internal

Methods

fold :: Monoid m => Node m -> m #

foldMap :: Monoid m => (a -> m) -> Node a -> m #

foldMap' :: Monoid m => (a -> m) -> Node a -> m #

foldr :: (a -> b -> b) -> b -> Node a -> b #

foldr' :: (a -> b -> b) -> b -> Node a -> b #

foldl :: (b -> a -> b) -> b -> Node a -> b #

foldl' :: (b -> a -> b) -> b -> Node a -> b #

foldr1 :: (a -> a -> a) -> Node a -> a #

foldl1 :: (a -> a -> a) -> Node a -> a #

toList :: Node a -> [a] #

null :: Node a -> Bool #

length :: Node a -> Int #

elem :: Eq a => a -> Node a -> Bool #

maximum :: Ord a => Node a -> a #

minimum :: Ord a => Node a -> a #

sum :: Num a => Node a -> a #

product :: Num a => Node a -> a #

Foldable Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

fold :: Monoid m => Seq m -> m #

foldMap :: Monoid m => (a -> m) -> Seq a -> m #

foldMap' :: Monoid m => (a -> m) -> Seq a -> m #

foldr :: (a -> b -> b) -> b -> Seq a -> b #

foldr' :: (a -> b -> b) -> b -> Seq a -> b #

foldl :: (b -> a -> b) -> b -> Seq a -> b #

foldl' :: (b -> a -> b) -> b -> Seq a -> b #

foldr1 :: (a -> a -> a) -> Seq a -> a #

foldl1 :: (a -> a -> a) -> Seq a -> a #

toList :: Seq a -> [a] #

null :: Seq a -> Bool #

length :: Seq a -> Int #

elem :: Eq a => a -> Seq a -> Bool #

maximum :: Ord a => Seq a -> a #

minimum :: Ord a => Seq a -> a #

sum :: Num a => Seq a -> a #

product :: Num a => Seq a -> a #

Foldable ViewL 
Instance details

Defined in Data.Sequence.Internal

Methods

fold :: Monoid m => ViewL m -> m #

foldMap :: Monoid m => (a -> m) -> ViewL a -> m #

foldMap' :: Monoid m => (a -> m) -> ViewL a -> m #

foldr :: (a -> b -> b) -> b -> ViewL a -> b #

foldr' :: (a -> b -> b) -> b -> ViewL a -> b #

foldl :: (b -> a -> b) -> b -> ViewL a -> b #

foldl' :: (b -> a -> b) -> b -> ViewL a -> b #

foldr1 :: (a -> a -> a) -> ViewL a -> a #

foldl1 :: (a -> a -> a) -> ViewL a -> a #

toList :: ViewL a -> [a] #

null :: ViewL a -> Bool #

length :: ViewL a -> Int #

elem :: Eq a => a -> ViewL a -> Bool #

maximum :: Ord a => ViewL a -> a #

minimum :: Ord a => ViewL a -> a #

sum :: Num a => ViewL a -> a #

product :: Num a => ViewL a -> a #

Foldable ViewR 
Instance details

Defined in Data.Sequence.Internal

Methods

fold :: Monoid m => ViewR m -> m #

foldMap :: Monoid m => (a -> m) -> ViewR a -> m #

foldMap' :: Monoid m => (a -> m) -> ViewR a -> m #

foldr :: (a -> b -> b) -> b -> ViewR a -> b #

foldr' :: (a -> b -> b) -> b -> ViewR a -> b #

foldl :: (b -> a -> b) -> b -> ViewR a -> b #

foldl' :: (b -> a -> b) -> b -> ViewR a -> b #

foldr1 :: (a -> a -> a) -> ViewR a -> a #

foldl1 :: (a -> a -> a) -> ViewR a -> a #

toList :: ViewR a -> [a] #

null :: ViewR a -> Bool #

length :: ViewR a -> Int #

elem :: Eq a => a -> ViewR a -> Bool #

maximum :: Ord a => ViewR a -> a #

minimum :: Ord a => ViewR a -> a #

sum :: Num a => ViewR a -> a #

product :: Num a => ViewR a -> a #

Foldable Set

Folds in order of increasing key.

Instance details

Defined in Data.Set.Internal

Methods

fold :: Monoid m => Set m -> m #

foldMap :: Monoid m => (a -> m) -> Set a -> m #

foldMap' :: Monoid m => (a -> m) -> Set a -> m #

foldr :: (a -> b -> b) -> b -> Set a -> b #

foldr' :: (a -> b -> b) -> b -> Set a -> b #

foldl :: (b -> a -> b) -> b -> Set a -> b #

foldl' :: (b -> a -> b) -> b -> Set a -> b #

foldr1 :: (a -> a -> a) -> Set a -> a #

foldl1 :: (a -> a -> a) -> Set a -> a #

toList :: Set a -> [a] #

null :: Set a -> Bool #

length :: Set a -> Int #

elem :: Eq a => a -> Set a -> Bool #

maximum :: Ord a => Set a -> a #

minimum :: Ord a => Set a -> a #

sum :: Num a => Set a -> a #

product :: Num a => Set a -> a #

Foldable Tree 
Instance details

Defined in Data.Tree

Methods

fold :: Monoid m => Tree m -> m #

foldMap :: Monoid m => (a -> m) -> Tree a -> m #

foldMap' :: Monoid m => (a -> m) -> Tree a -> m #

foldr :: (a -> b -> b) -> b -> Tree a -> b #

foldr' :: (a -> b -> b) -> b -> Tree a -> b #

foldl :: (b -> a -> b) -> b -> Tree a -> b #

foldl' :: (b -> a -> b) -> b -> Tree a -> b #

foldr1 :: (a -> a -> a) -> Tree a -> a #

foldl1 :: (a -> a -> a) -> Tree a -> a #

toList :: Tree a -> [a] #

null :: Tree a -> Bool #

length :: Tree a -> Int #

elem :: Eq a => a -> Tree a -> Bool #

maximum :: Ord a => Tree a -> a #

minimum :: Ord a => Tree a -> a #

sum :: Num a => Tree a -> a #

product :: Num a => Tree a -> a #

Foldable DNonEmpty 
Instance details

Defined in Data.DList.DNonEmpty.Internal

Methods

fold :: Monoid m => DNonEmpty m -> m #

foldMap :: Monoid m => (a -> m) -> DNonEmpty a -> m #

foldMap' :: Monoid m => (a -> m) -> DNonEmpty a -> m #

foldr :: (a -> b -> b) -> b -> DNonEmpty a -> b #

foldr' :: (a -> b -> b) -> b -> DNonEmpty a -> b #

foldl :: (b -> a -> b) -> b -> DNonEmpty a -> b #

foldl' :: (b -> a -> b) -> b -> DNonEmpty a -> b #

foldr1 :: (a -> a -> a) -> DNonEmpty a -> a #

foldl1 :: (a -> a -> a) -> DNonEmpty a -> a #

toList :: DNonEmpty a -> [a] #

null :: DNonEmpty a -> Bool #

length :: DNonEmpty a -> Int #

elem :: Eq a => a -> DNonEmpty a -> Bool #

maximum :: Ord a => DNonEmpty a -> a #

minimum :: Ord a => DNonEmpty a -> a #

sum :: Num a => DNonEmpty a -> a #

product :: Num a => DNonEmpty a -> a #

Foldable DList 
Instance details

Defined in Data.DList.Internal

Methods

fold :: Monoid m => DList m -> m #

foldMap :: Monoid m => (a -> m) -> DList a -> m #

foldMap' :: Monoid m => (a -> m) -> DList a -> m #

foldr :: (a -> b -> b) -> b -> DList a -> b #

foldr' :: (a -> b -> b) -> b -> DList a -> b #

foldl :: (b -> a -> b) -> b -> DList a -> b #

foldl' :: (b -> a -> b) -> b -> DList a -> b #

foldr1 :: (a -> a -> a) -> DList a -> a #

foldl1 :: (a -> a -> a) -> DList a -> a #

toList :: DList a -> [a] #

null :: DList a -> Bool #

length :: DList a -> Int #

elem :: Eq a => a -> DList a -> Bool #

maximum :: Ord a => DList a -> a #

minimum :: Ord a => DList a -> a #

sum :: Num a => DList a -> a #

product :: Num a => DList a -> a #

Foldable Hashed 
Instance details

Defined in Data.Hashable.Class

Methods

fold :: Monoid m => Hashed m -> m #

foldMap :: Monoid m => (a -> m) -> Hashed a -> m #

foldMap' :: Monoid m => (a -> m) -> Hashed a -> m #

foldr :: (a -> b -> b) -> b -> Hashed a -> b #

foldr' :: (a -> b -> b) -> b -> Hashed a -> b #

foldl :: (b -> a -> b) -> b -> Hashed a -> b #

foldl' :: (b -> a -> b) -> b -> Hashed a -> b #

foldr1 :: (a -> a -> a) -> Hashed a -> a #

foldl1 :: (a -> a -> a) -> Hashed a -> a #

toList :: Hashed a -> [a] #

null :: Hashed a -> Bool #

length :: Hashed a -> Int #

elem :: Eq a => a -> Hashed a -> Bool #

maximum :: Ord a => Hashed a -> a #

minimum :: Ord a => Hashed a -> a #

sum :: Num a => Hashed a -> a #

product :: Num a => Hashed a -> a #

Foldable LenientData 
Instance details

Defined in Web.Internal.HttpApiData

Methods

fold :: Monoid m => LenientData m -> m #

foldMap :: Monoid m => (a -> m) -> LenientData a -> m #

foldMap' :: Monoid m => (a -> m) -> LenientData a -> m #

foldr :: (a -> b -> b) -> b -> LenientData a -> b #

foldr' :: (a -> b -> b) -> b -> LenientData a -> b #

foldl :: (b -> a -> b) -> b -> LenientData a -> b #

foldl' :: (b -> a -> b) -> b -> LenientData a -> b #

foldr1 :: (a -> a -> a) -> LenientData a -> a #

foldl1 :: (a -> a -> a) -> LenientData a -> a #

toList :: LenientData a -> [a] #

null :: LenientData a -> Bool #

length :: LenientData a -> Int #

elem :: Eq a => a -> LenientData a -> Bool #

maximum :: Ord a => LenientData a -> a #

minimum :: Ord a => LenientData a -> a #

sum :: Num a => LenientData a -> a #

product :: Num a => LenientData a -> a #

Foldable PoolList 
Instance details

Defined in Data.KeyedPool

Methods

fold :: Monoid m => PoolList m -> m #

foldMap :: Monoid m => (a -> m) -> PoolList a -> m #

foldMap' :: Monoid m => (a -> m) -> PoolList a -> m #

foldr :: (a -> b -> b) -> b -> PoolList a -> b #

foldr' :: (a -> b -> b) -> b -> PoolList a -> b #

foldl :: (b -> a -> b) -> b -> PoolList a -> b #

foldl' :: (b -> a -> b) -> b -> PoolList a -> b #

foldr1 :: (a -> a -> a) -> PoolList a -> a #

foldl1 :: (a -> a -> a) -> PoolList a -> a #

toList :: PoolList a -> [a] #

null :: PoolList a -> Bool #

length :: PoolList a -> Int #

elem :: Eq a => a -> PoolList a -> Bool #

maximum :: Ord a => PoolList a -> a #

minimum :: Ord a => PoolList a -> a #

sum :: Num a => PoolList a -> a #

product :: Num a => PoolList a -> a #

Foldable HistoriedResponse 
Instance details

Defined in Network.HTTP.Client

Methods

fold :: Monoid m => HistoriedResponse m -> m #

foldMap :: Monoid m => (a -> m) -> HistoriedResponse a -> m #

foldMap' :: Monoid m => (a -> m) -> HistoriedResponse a -> m #

foldr :: (a -> b -> b) -> b -> HistoriedResponse a -> b #

foldr' :: (a -> b -> b) -> b -> HistoriedResponse a -> b #

foldl :: (b -> a -> b) -> b -> HistoriedResponse a -> b #

foldl' :: (b -> a -> b) -> b -> HistoriedResponse a -> b #

foldr1 :: (a -> a -> a) -> HistoriedResponse a -> a #

foldl1 :: (a -> a -> a) -> HistoriedResponse a -> a #

toList :: HistoriedResponse a -> [a] #

null :: HistoriedResponse a -> Bool #

length :: HistoriedResponse a -> Int #

elem :: Eq a => a -> HistoriedResponse a -> Bool #

maximum :: Ord a => HistoriedResponse a -> a #

minimum :: Ord a => HistoriedResponse a -> a #

sum :: Num a => HistoriedResponse a -> a #

product :: Num a => HistoriedResponse a -> a #

Foldable Response 
Instance details

Defined in Network.HTTP.Client.Types

Methods

fold :: Monoid m => Response m -> m #

foldMap :: Monoid m => (a -> m) -> Response a -> m #

foldMap' :: Monoid m => (a -> m) -> Response a -> m #

foldr :: (a -> b -> b) -> b -> Response a -> b #

foldr' :: (a -> b -> b) -> b -> Response a -> b #

foldl :: (b -> a -> b) -> b -> Response a -> b #

foldl' :: (b -> a -> b) -> b -> Response a -> b #

foldr1 :: (a -> a -> a) -> Response a -> a #

foldl1 :: (a -> a -> a) -> Response a -> a #

toList :: Response a -> [a] #

null :: Response a -> Bool #

length :: Response a -> Int #

elem :: Eq a => a -> Response a -> Bool #

maximum :: Ord a => Response a -> a #

minimum :: Ord a => Response a -> a #

sum :: Num a => Response a -> a #

product :: Num a => Response a -> a #

Foldable SimpleDocStream

Collect all annotations from a document.

Instance details

Defined in Prettyprinter.Internal

Methods

fold :: Monoid m => SimpleDocStream m -> m #

foldMap :: Monoid m => (a -> m) -> SimpleDocStream a -> m #

foldMap' :: Monoid m => (a -> m) -> SimpleDocStream a -> m #

foldr :: (a -> b -> b) -> b -> SimpleDocStream a -> b #

foldr' :: (a -> b -> b) -> b -> SimpleDocStream a -> b #

foldl :: (b -> a -> b) -> b -> SimpleDocStream a -> b #

foldl' :: (b -> a -> b) -> b -> SimpleDocStream a -> b #

foldr1 :: (a -> a -> a) -> SimpleDocStream a -> a #

foldl1 :: (a -> a -> a) -> SimpleDocStream a -> a #

toList :: SimpleDocStream a -> [a] #

null :: SimpleDocStream a -> Bool #

length :: SimpleDocStream a -> Int #

elem :: Eq a => a -> SimpleDocStream a -> Bool #

maximum :: Ord a => SimpleDocStream a -> a #

minimum :: Ord a => SimpleDocStream a -> a #

sum :: Num a => SimpleDocStream a -> a #

product :: Num a => SimpleDocStream a -> a #

Foldable Array 
Instance details

Defined in Data.Primitive.Array

Methods

fold :: Monoid m => Array m -> m #

foldMap :: Monoid m => (a -> m) -> Array a -> m #

foldMap' :: Monoid m => (a -> m) -> Array a -> m #

foldr :: (a -> b -> b) -> b -> Array a -> b #

foldr' :: (a -> b -> b) -> b -> Array a -> b #

foldl :: (b -> a -> b) -> b -> Array a -> b #

foldl' :: (b -> a -> b) -> b -> Array a -> b #

foldr1 :: (a -> a -> a) -> Array a -> a #

foldl1 :: (a -> a -> a) -> Array a -> a #

toList :: Array a -> [a] #

null :: Array a -> Bool #

length :: Array a -> Int #

elem :: Eq a => a -> Array a -> Bool #

maximum :: Ord a => Array a -> a #

minimum :: Ord a => Array a -> a #

sum :: Num a => Array a -> a #

product :: Num a => Array a -> a #

Foldable SmallArray 
Instance details

Defined in Data.Primitive.SmallArray

Methods

fold :: Monoid m => SmallArray m -> m #

foldMap :: Monoid m => (a -> m) -> SmallArray a -> m #

foldMap' :: Monoid m => (a -> m) -> SmallArray a -> m #

foldr :: (a -> b -> b) -> b -> SmallArray a -> b #

foldr' :: (a -> b -> b) -> b -> SmallArray a -> b #

foldl :: (b -> a -> b) -> b -> SmallArray a -> b #

foldl' :: (b -> a -> b) -> b -> SmallArray a -> b #

foldr1 :: (a -> a -> a) -> SmallArray a -> a #

foldl1 :: (a -> a -> a) -> SmallArray a -> a #

toList :: SmallArray a -> [a] #

null :: SmallArray a -> Bool #

length :: SmallArray a -> Int #

elem :: Eq a => a -> SmallArray a -> Bool #

maximum :: Ord a => SmallArray a -> a #

minimum :: Ord a => SmallArray a -> a #

sum :: Num a => SmallArray a -> a #

product :: Num a => SmallArray a -> a #

Foldable Result 
Instance details

Defined in Codec.QRCode.Data.Result

Methods

fold :: Monoid m => Result m -> m #

foldMap :: Monoid m => (a -> m) -> Result a -> m #

foldMap' :: Monoid m => (a -> m) -> Result a -> m #

foldr :: (a -> b -> b) -> b -> Result a -> b #

foldr' :: (a -> b -> b) -> b -> Result a -> b #

foldl :: (b -> a -> b) -> b -> Result a -> b #

foldl' :: (b -> a -> b) -> b -> Result a -> b #

foldr1 :: (a -> a -> a) -> Result a -> a #

foldl1 :: (a -> a -> a) -> Result a -> a #

toList :: Result a -> [a] #

null :: Result a -> Bool #

length :: Result a -> Int #

elem :: Eq a => a -> Result a -> Bool #

maximum :: Ord a => Result a -> a #

minimum :: Ord a => Result a -> a #

sum :: Num a => Result a -> a #

product :: Num a => Result a -> a #

Foldable Maybe 
Instance details

Defined in Data.Strict.Maybe

Methods

fold :: Monoid m => Maybe m -> m #

foldMap :: Monoid m => (a -> m) -> Maybe a -> m #

foldMap' :: Monoid m => (a -> m) -> Maybe a -> m #

foldr :: (a -> b -> b) -> b -> Maybe a -> b #

foldr' :: (a -> b -> b) -> b -> Maybe a -> b #

foldl :: (b -> a -> b) -> b -> Maybe a -> b #

foldl' :: (b -> a -> b) -> b -> Maybe a -> b #

foldr1 :: (a -> a -> a) -> Maybe a -> a #

foldl1 :: (a -> a -> a) -> Maybe a -> a #

toList :: Maybe a -> [a] #

null :: Maybe a -> Bool #

length :: Maybe a -> Int #

elem :: Eq a => a -> Maybe a -> Bool #

maximum :: Ord a => Maybe a -> a #

minimum :: Ord a => Maybe a -> a #

sum :: Num a => Maybe a -> a #

product :: Num a => Maybe a -> a #

Foldable HashSet 
Instance details

Defined in Data.HashSet.Internal

Methods

fold :: Monoid m => HashSet m -> m #

foldMap :: Monoid m => (a -> m) -> HashSet a -> m #

foldMap' :: Monoid m => (a -> m) -> HashSet a -> m #

foldr :: (a -> b -> b) -> b -> HashSet a -> b #

foldr' :: (a -> b -> b) -> b -> HashSet a -> b #

foldl :: (b -> a -> b) -> b -> HashSet a -> b #

foldl' :: (b -> a -> b) -> b -> HashSet a -> b #

foldr1 :: (a -> a -> a) -> HashSet a -> a #

foldl1 :: (a -> a -> a) -> HashSet a -> a #

toList :: HashSet a -> [a] #

null :: HashSet a -> Bool #

length :: HashSet a -> Int #

elem :: Eq a => a -> HashSet a -> Bool #

maximum :: Ord a => HashSet a -> a #

minimum :: Ord a => HashSet a -> a #

sum :: Num a => HashSet a -> a #

product :: Num a => HashSet a -> a #

Foldable Vector 
Instance details

Defined in Data.Vector

Methods

fold :: Monoid m => Vector m -> m #

foldMap :: Monoid m => (a -> m) -> Vector a -> m #

foldMap' :: Monoid m => (a -> m) -> Vector a -> m #

foldr :: (a -> b -> b) -> b -> Vector a -> b #

foldr' :: (a -> b -> b) -> b -> Vector a -> b #

foldl :: (b -> a -> b) -> b -> Vector a -> b #

foldl' :: (b -> a -> b) -> b -> Vector a -> b #

foldr1 :: (a -> a -> a) -> Vector a -> a #

foldl1 :: (a -> a -> a) -> Vector a -> a #

toList :: Vector a -> [a] #

null :: Vector a -> Bool #

length :: Vector a -> Int #

elem :: Eq a => a -> Vector a -> Bool #

maximum :: Ord a => Vector a -> a #

minimum :: Ord a => Vector a -> a #

sum :: Num a => Vector a -> a #

product :: Num a => Vector a -> a #

Foldable FormResult

Since: yesod-form-1.4.5

Instance details

Defined in Yesod.Form.Types

Methods

fold :: Monoid m => FormResult m -> m #

foldMap :: Monoid m => (a -> m) -> FormResult a -> m #

foldMap' :: Monoid m => (a -> m) -> FormResult a -> m #

foldr :: (a -> b -> b) -> b -> FormResult a -> b #

foldr' :: (a -> b -> b) -> b -> FormResult a -> b #

foldl :: (b -> a -> b) -> b -> FormResult a -> b #

foldl' :: (b -> a -> b) -> b -> FormResult a -> b #

foldr1 :: (a -> a -> a) -> FormResult a -> a #

foldl1 :: (a -> a -> a) -> FormResult a -> a #

toList :: FormResult a -> [a] #

null :: FormResult a -> Bool #

length :: FormResult a -> Int #

elem :: Eq a => a -> FormResult a -> Bool #

maximum :: Ord a => FormResult a -> a #

minimum :: Ord a => FormResult a -> a #

sum :: Num a => FormResult a -> a #

product :: Num a => FormResult a -> a #

Foldable Maybe

Since: base-2.1

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Maybe m -> m #

foldMap :: Monoid m => (a -> m) -> Maybe a -> m #

foldMap' :: Monoid m => (a -> m) -> Maybe a -> m #

foldr :: (a -> b -> b) -> b -> Maybe a -> b #

foldr' :: (a -> b -> b) -> b -> Maybe a -> b #

foldl :: (b -> a -> b) -> b -> Maybe a -> b #

foldl' :: (b -> a -> b) -> b -> Maybe a -> b #

foldr1 :: (a -> a -> a) -> Maybe a -> a #

foldl1 :: (a -> a -> a) -> Maybe a -> a #

toList :: Maybe a -> [a] #

null :: Maybe a -> Bool #

length :: Maybe a -> Int #

elem :: Eq a => a -> Maybe a -> Bool #

maximum :: Ord a => Maybe a -> a #

minimum :: Ord a => Maybe a -> a #

sum :: Num a => Maybe a -> a #

product :: Num a => Maybe a -> a #

Foldable Solo

Since: base-4.15

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Solo m -> m #

foldMap :: Monoid m => (a -> m) -> Solo a -> m #

foldMap' :: Monoid m => (a -> m) -> Solo a -> m #

foldr :: (a -> b -> b) -> b -> Solo a -> b #

foldr' :: (a -> b -> b) -> b -> Solo a -> b #

foldl :: (b -> a -> b) -> b -> Solo a -> b #

foldl' :: (b -> a -> b) -> b -> Solo a -> b #

foldr1 :: (a -> a -> a) -> Solo a -> a #

foldl1 :: (a -> a -> a) -> Solo a -> a #

toList :: Solo a -> [a] #

null :: Solo a -> Bool #

length :: Solo a -> Int #

elem :: Eq a => a -> Solo a -> Bool #

maximum :: Ord a => Solo a -> a #

minimum :: Ord a => Solo a -> a #

sum :: Num a => Solo a -> a #

product :: Num a => Solo a -> a #

Foldable []

Since: base-2.1

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => [m] -> m #

foldMap :: Monoid m => (a -> m) -> [a] -> m #

foldMap' :: Monoid m => (a -> m) -> [a] -> m #

foldr :: (a -> b -> b) -> b -> [a] -> b #

foldr' :: (a -> b -> b) -> b -> [a] -> b #

foldl :: (b -> a -> b) -> b -> [a] -> b #

foldl' :: (b -> a -> b) -> b -> [a] -> b #

foldr1 :: (a -> a -> a) -> [a] -> a #

foldl1 :: (a -> a -> a) -> [a] -> a #

toList :: [a] -> [a] #

null :: [a] -> Bool #

length :: [a] -> Int #

elem :: Eq a => a -> [a] -> Bool #

maximum :: Ord a => [a] -> a #

minimum :: Ord a => [a] -> a #

sum :: Num a => [a] -> a #

product :: Num a => [a] -> a #

Foldable (Either a)

Since: base-4.7.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Either a m -> m #

foldMap :: Monoid m => (a0 -> m) -> Either a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> Either a a0 -> m #

foldr :: (a0 -> b -> b) -> b -> Either a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Either a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> Either a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> Either a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Either a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> Either a a0 -> a0 #

toList :: Either a a0 -> [a0] #

null :: Either a a0 -> Bool #

length :: Either a a0 -> Int #

elem :: Eq a0 => a0 -> Either a a0 -> Bool #

maximum :: Ord a0 => Either a a0 -> a0 #

minimum :: Ord a0 => Either a a0 -> a0 #

sum :: Num a0 => Either a a0 -> a0 #

product :: Num a0 => Either a a0 -> a0 #

Foldable (Proxy :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Proxy m -> m #

foldMap :: Monoid m => (a -> m) -> Proxy a -> m #

foldMap' :: Monoid m => (a -> m) -> Proxy a -> m #

foldr :: (a -> b -> b) -> b -> Proxy a -> b #

foldr' :: (a -> b -> b) -> b -> Proxy a -> b #

foldl :: (b -> a -> b) -> b -> Proxy a -> b #

foldl' :: (b -> a -> b) -> b -> Proxy a -> b #

foldr1 :: (a -> a -> a) -> Proxy a -> a #

foldl1 :: (a -> a -> a) -> Proxy a -> a #

toList :: Proxy a -> [a] #

null :: Proxy a -> Bool #

length :: Proxy a -> Int #

elem :: Eq a => a -> Proxy a -> Bool #

maximum :: Ord a => Proxy a -> a #

minimum :: Ord a => Proxy a -> a #

sum :: Num a => Proxy a -> a #

product :: Num a => Proxy a -> a #

Foldable (Arg a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

fold :: Monoid m => Arg a m -> m #

foldMap :: Monoid m => (a0 -> m) -> Arg a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> Arg a a0 -> m #

foldr :: (a0 -> b -> b) -> b -> Arg a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Arg a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> Arg a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> Arg a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Arg a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> Arg a a0 -> a0 #

toList :: Arg a a0 -> [a0] #

null :: Arg a a0 -> Bool #

length :: Arg a a0 -> Int #

elem :: Eq a0 => a0 -> Arg a a0 -> Bool #

maximum :: Ord a0 => Arg a a0 -> a0 #

minimum :: Ord a0 => Arg a a0 -> a0 #

sum :: Num a0 => Arg a a0 -> a0 #

product :: Num a0 => Arg a a0 -> a0 #

Foldable (Array i)

Since: base-4.8.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Array i m -> m #

foldMap :: Monoid m => (a -> m) -> Array i a -> m #

foldMap' :: Monoid m => (a -> m) -> Array i a -> m #

foldr :: (a -> b -> b) -> b -> Array i a -> b #

foldr' :: (a -> b -> b) -> b -> Array i a -> b #

foldl :: (b -> a -> b) -> b -> Array i a -> b #

foldl' :: (b -> a -> b) -> b -> Array i a -> b #

foldr1 :: (a -> a -> a) -> Array i a -> a #

foldl1 :: (a -> a -> a) -> Array i a -> a #

toList :: Array i a -> [a] #

null :: Array i a -> Bool #

length :: Array i a -> Int #

elem :: Eq a => a -> Array i a -> Bool #

maximum :: Ord a => Array i a -> a #

minimum :: Ord a => Array i a -> a #

sum :: Num a => Array i a -> a #

product :: Num a => Array i a -> a #

Foldable (U1 :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => U1 m -> m #

foldMap :: Monoid m => (a -> m) -> U1 a -> m #

foldMap' :: Monoid m => (a -> m) -> U1 a -> m #

foldr :: (a -> b -> b) -> b -> U1 a -> b #

foldr' :: (a -> b -> b) -> b -> U1 a -> b #

foldl :: (b -> a -> b) -> b -> U1 a -> b #

foldl' :: (b -> a -> b) -> b -> U1 a -> b #

foldr1 :: (a -> a -> a) -> U1 a -> a #

foldl1 :: (a -> a -> a) -> U1 a -> a #

toList :: U1 a -> [a] #

null :: U1 a -> Bool #

length :: U1 a -> Int #

elem :: Eq a => a -> U1 a -> Bool #

maximum :: Ord a => U1 a -> a #

minimum :: Ord a => U1 a -> a #

sum :: Num a => U1 a -> a #

product :: Num a => U1 a -> a #

Foldable (UAddr :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => UAddr m -> m #

foldMap :: Monoid m => (a -> m) -> UAddr a -> m #

foldMap' :: Monoid m => (a -> m) -> UAddr a -> m #

foldr :: (a -> b -> b) -> b -> UAddr a -> b #

foldr' :: (a -> b -> b) -> b -> UAddr a -> b #

foldl :: (b -> a -> b) -> b -> UAddr a -> b #

foldl' :: (b -> a -> b) -> b -> UAddr a -> b #

foldr1 :: (a -> a -> a) -> UAddr a -> a #

foldl1 :: (a -> a -> a) -> UAddr a -> a #

toList :: UAddr a -> [a] #

null :: UAddr a -> Bool #

length :: UAddr a -> Int #

elem :: Eq a => a -> UAddr a -> Bool #

maximum :: Ord a => UAddr a -> a #

minimum :: Ord a => UAddr a -> a #

sum :: Num a => UAddr a -> a #

product :: Num a => UAddr a -> a #

Foldable (UChar :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => UChar m -> m #

foldMap :: Monoid m => (a -> m) -> UChar a -> m #

foldMap' :: Monoid m => (a -> m) -> UChar a -> m #

foldr :: (a -> b -> b) -> b -> UChar a -> b #

foldr' :: (a -> b -> b) -> b -> UChar a -> b #

foldl :: (b -> a -> b) -> b -> UChar a -> b #

foldl' :: (b -> a -> b) -> b -> UChar a -> b #

foldr1 :: (a -> a -> a) -> UChar a -> a #

foldl1 :: (a -> a -> a) -> UChar a -> a #

toList :: UChar a -> [a] #

null :: UChar a -> Bool #

length :: UChar a -> Int #

elem :: Eq a => a -> UChar a -> Bool #

maximum :: Ord a => UChar a -> a #

minimum :: Ord a => UChar a -> a #

sum :: Num a => UChar a -> a #

product :: Num a => UChar a -> a #

Foldable (UDouble :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => UDouble m -> m #

foldMap :: Monoid m => (a -> m) -> UDouble a -> m #

foldMap' :: Monoid m => (a -> m) -> UDouble a -> m #

foldr :: (a -> b -> b) -> b -> UDouble a -> b #

foldr' :: (a -> b -> b) -> b -> UDouble a -> b #

foldl :: (b -> a -> b) -> b -> UDouble a -> b #

foldl' :: (b -> a -> b) -> b -> UDouble a -> b #

foldr1 :: (a -> a -> a) -> UDouble a -> a #

foldl1 :: (a -> a -> a) -> UDouble a -> a #

toList :: UDouble a -> [a] #

null :: UDouble a -> Bool #

length :: UDouble a -> Int #

elem :: Eq a => a -> UDouble a -> Bool #

maximum :: Ord a => UDouble a -> a #

minimum :: Ord a => UDouble a -> a #

sum :: Num a => UDouble a -> a #

product :: Num a => UDouble a -> a #

Foldable (UFloat :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => UFloat m -> m #

foldMap :: Monoid m => (a -> m) -> UFloat a -> m #

foldMap' :: Monoid m => (a -> m) -> UFloat a -> m #

foldr :: (a -> b -> b) -> b -> UFloat a -> b #

foldr' :: (a -> b -> b) -> b -> UFloat a -> b #

foldl :: (b -> a -> b) -> b -> UFloat a -> b #

foldl' :: (b -> a -> b) -> b -> UFloat a -> b #

foldr1 :: (a -> a -> a) -> UFloat a -> a #

foldl1 :: (a -> a -> a) -> UFloat a -> a #

toList :: UFloat a -> [a] #

null :: UFloat a -> Bool #

length :: UFloat a -> Int #

elem :: Eq a => a -> UFloat a -> Bool #

maximum :: Ord a => UFloat a -> a #

minimum :: Ord a => UFloat a -> a #

sum :: Num a => UFloat a -> a #

product :: Num a => UFloat a -> a #

Foldable (UInt :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => UInt m -> m #

foldMap :: Monoid m => (a -> m) -> UInt a -> m #

foldMap' :: Monoid m => (a -> m) -> UInt a -> m #

foldr :: (a -> b -> b) -> b -> UInt a -> b #

foldr' :: (a -> b -> b) -> b -> UInt a -> b #

foldl :: (b -> a -> b) -> b -> UInt a -> b #

foldl' :: (b -> a -> b) -> b -> UInt a -> b #

foldr1 :: (a -> a -> a) -> UInt a -> a #

foldl1 :: (a -> a -> a) -> UInt a -> a #

toList :: UInt a -> [a] #

null :: UInt a -> Bool #

length :: UInt a -> Int #

elem :: Eq a => a -> UInt a -> Bool #

maximum :: Ord a => UInt a -> a #

minimum :: Ord a => UInt a -> a #

sum :: Num a => UInt a -> a #

product :: Num a => UInt a -> a #

Foldable (UWord :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => UWord m -> m #

foldMap :: Monoid m => (a -> m) -> UWord a -> m #

foldMap' :: Monoid m => (a -> m) -> UWord a -> m #

foldr :: (a -> b -> b) -> b -> UWord a -> b #

foldr' :: (a -> b -> b) -> b -> UWord a -> b #

foldl :: (b -> a -> b) -> b -> UWord a -> b #

foldl' :: (b -> a -> b) -> b -> UWord a -> b #

foldr1 :: (a -> a -> a) -> UWord a -> a #

foldl1 :: (a -> a -> a) -> UWord a -> a #

toList :: UWord a -> [a] #

null :: UWord a -> Bool #

length :: UWord a -> Int #

elem :: Eq a => a -> UWord a -> Bool #

maximum :: Ord a => UWord a -> a #

minimum :: Ord a => UWord a -> a #

sum :: Num a => UWord a -> a #

product :: Num a => UWord a -> a #

Foldable (V1 :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => V1 m -> m #

foldMap :: Monoid m => (a -> m) -> V1 a -> m #

foldMap' :: Monoid m => (a -> m) -> V1 a -> m #

foldr :: (a -> b -> b) -> b -> V1 a -> b #

foldr' :: (a -> b -> b) -> b -> V1 a -> b #

foldl :: (b -> a -> b) -> b -> V1 a -> b #

foldl' :: (b -> a -> b) -> b -> V1 a -> b #

foldr1 :: (a -> a -> a) -> V1 a -> a #

foldl1 :: (a -> a -> a) -> V1 a -> a #

toList :: V1 a -> [a] #

null :: V1 a -> Bool #

length :: V1 a -> Int #

elem :: Eq a => a -> V1 a -> Bool #

maximum :: Ord a => V1 a -> a #

minimum :: Ord a => V1 a -> a #

sum :: Num a => V1 a -> a #

product :: Num a => V1 a -> a #

Foldable (Map k)

Folds in order of increasing key.

Instance details

Defined in Data.Map.Internal

Methods

fold :: Monoid m => Map k m -> m #

foldMap :: Monoid m => (a -> m) -> Map k a -> m #

foldMap' :: Monoid m => (a -> m) -> Map k a -> m #

foldr :: (a -> b -> b) -> b -> Map k a -> b #

foldr' :: (a -> b -> b) -> b -> Map k a -> b #

foldl :: (b -> a -> b) -> b -> Map k a -> b #

foldl' :: (b -> a -> b) -> b -> Map k a -> b #

foldr1 :: (a -> a -> a) -> Map k a -> a #

foldl1 :: (a -> a -> a) -> Map k a -> a #

toList :: Map k a -> [a] #

null :: Map k a -> Bool #

length :: Map k a -> Int #

elem :: Eq a => a -> Map k a -> Bool #

maximum :: Ord a => Map k a -> a #

minimum :: Ord a => Map k a -> a #

sum :: Num a => Map k a -> a #

product :: Num a => Map k a -> a #

Foldable m => Foldable (CatchT m) 
Instance details

Defined in Control.Monad.Catch.Pure

Methods

fold :: Monoid m0 => CatchT m m0 -> m0 #

foldMap :: Monoid m0 => (a -> m0) -> CatchT m a -> m0 #

foldMap' :: Monoid m0 => (a -> m0) -> CatchT m a -> m0 #

foldr :: (a -> b -> b) -> b -> CatchT m a -> b #

foldr' :: (a -> b -> b) -> b -> CatchT m a -> b #

foldl :: (b -> a -> b) -> b -> CatchT m a -> b #

foldl' :: (b -> a -> b) -> b -> CatchT m a -> b #

foldr1 :: (a -> a -> a) -> CatchT m a -> a #

foldl1 :: (a -> a -> a) -> CatchT m a -> a #

toList :: CatchT m a -> [a] #

null :: CatchT m a -> Bool #

length :: CatchT m a -> Int #

elem :: Eq a => a -> CatchT m a -> Bool #

maximum :: Ord a => CatchT m a -> a #

minimum :: Ord a => CatchT m a -> a #

sum :: Num a => CatchT m a -> a #

product :: Num a => CatchT m a -> a #

Foldable f => Foldable (Cofree f) 
Instance details

Defined in Control.Comonad.Cofree

Methods

fold :: Monoid m => Cofree f m -> m #

foldMap :: Monoid m => (a -> m) -> Cofree f a -> m #

foldMap' :: Monoid m => (a -> m) -> Cofree f a -> m #

foldr :: (a -> b -> b) -> b -> Cofree f a -> b #

foldr' :: (a -> b -> b) -> b -> Cofree f a -> b #

foldl :: (b -> a -> b) -> b -> Cofree f a -> b #

foldl' :: (b -> a -> b) -> b -> Cofree f a -> b #

foldr1 :: (a -> a -> a) -> Cofree f a -> a #

foldl1 :: (a -> a -> a) -> Cofree f a -> a #

toList :: Cofree f a -> [a] #

null :: Cofree f a -> Bool #

length :: Cofree f a -> Int #

elem :: Eq a => a -> Cofree f a -> Bool #

maximum :: Ord a => Cofree f a -> a #

minimum :: Ord a => Cofree f a -> a #

sum :: Num a => Cofree f a -> a #

product :: Num a => Cofree f a -> a #

Foldable f => Foldable (Free f) 
Instance details

Defined in Control.Monad.Free

Methods

fold :: Monoid m => Free f m -> m #

foldMap :: Monoid m => (a -> m) -> Free f a -> m #

foldMap' :: Monoid m => (a -> m) -> Free f a -> m #

foldr :: (a -> b -> b) -> b -> Free f a -> b #

foldr' :: (a -> b -> b) -> b -> Free f a -> b #

foldl :: (b -> a -> b) -> b -> Free f a -> b #

foldl' :: (b -> a -> b) -> b -> Free f a -> b #

foldr1 :: (a -> a -> a) -> Free f a -> a #

foldl1 :: (a -> a -> a) -> Free f a -> a #

toList :: Free f a -> [a] #

null :: Free f a -> Bool #

length :: Free f a -> Int #

elem :: Eq a => a -> Free f a -> Bool #

maximum :: Ord a => Free f a -> a #

minimum :: Ord a => Free f a -> a #

sum :: Num a => Free f a -> a #

product :: Num a => Free f a -> a #

Foldable (PoolMap key) 
Instance details

Defined in Data.KeyedPool

Methods

fold :: Monoid m => PoolMap key m -> m #

foldMap :: Monoid m => (a -> m) -> PoolMap key a -> m #

foldMap' :: Monoid m => (a -> m) -> PoolMap key a -> m #

foldr :: (a -> b -> b) -> b -> PoolMap key a -> b #

foldr' :: (a -> b -> b) -> b -> PoolMap key a -> b #

foldl :: (b -> a -> b) -> b -> PoolMap key a -> b #

foldl' :: (b -> a -> b) -> b -> PoolMap key a -> b #

foldr1 :: (a -> a -> a) -> PoolMap key a -> a #

foldl1 :: (a -> a -> a) -> PoolMap key a -> a #

toList :: PoolMap key a -> [a] #

null :: PoolMap key a -> Bool #

length :: PoolMap key a -> Int #

elem :: Eq a => a -> PoolMap key a -> Bool #

maximum :: Ord a => PoolMap key a -> a #

minimum :: Ord a => PoolMap key a -> a #

sum :: Num a => PoolMap key a -> a #

product :: Num a => PoolMap key a -> a #

MonoFoldable mono => Foldable (WrappedMono mono) 
Instance details

Defined in Data.MonoTraversable

Methods

fold :: Monoid m => WrappedMono mono m -> m #

foldMap :: Monoid m => (a -> m) -> WrappedMono mono a -> m #

foldMap' :: Monoid m => (a -> m) -> WrappedMono mono a -> m #

foldr :: (a -> b -> b) -> b -> WrappedMono mono a -> b #

foldr' :: (a -> b -> b) -> b -> WrappedMono mono a -> b #

foldl :: (b -> a -> b) -> b -> WrappedMono mono a -> b #

foldl' :: (b -> a -> b) -> b -> WrappedMono mono a -> b #

foldr1 :: (a -> a -> a) -> WrappedMono mono a -> a #

foldl1 :: (a -> a -> a) -> WrappedMono mono a -> a #

toList :: WrappedMono mono a -> [a] #

null :: WrappedMono mono a -> Bool #

length :: WrappedMono mono a -> Int #

elem :: Eq a => a -> WrappedMono mono a -> Bool #

maximum :: Ord a => WrappedMono mono a -> a #

minimum :: Ord a => WrappedMono mono a -> a #

sum :: Num a => WrappedMono mono a -> a #

product :: Num a => WrappedMono mono a -> a #

Foldable f => Foldable (WrappedPoly f) 
Instance details

Defined in Data.MonoTraversable

Methods

fold :: Monoid m => WrappedPoly f m -> m #

foldMap :: Monoid m => (a -> m) -> WrappedPoly f a -> m #

foldMap' :: Monoid m => (a -> m) -> WrappedPoly f a -> m #

foldr :: (a -> b -> b) -> b -> WrappedPoly f a -> b #

foldr' :: (a -> b -> b) -> b -> WrappedPoly f a -> b #

foldl :: (b -> a -> b) -> b -> WrappedPoly f a -> b #

foldl' :: (b -> a -> b) -> b -> WrappedPoly f a -> b #

foldr1 :: (a -> a -> a) -> WrappedPoly f a -> a #

foldl1 :: (a -> a -> a) -> WrappedPoly f a -> a #

toList :: WrappedPoly f a -> [a] #

null :: WrappedPoly f a -> Bool #

length :: WrappedPoly f a -> Int #

elem :: Eq a => a -> WrappedPoly f a -> Bool #

maximum :: Ord a => WrappedPoly f a -> a #

minimum :: Ord a => WrappedPoly f a -> a #

sum :: Num a => WrappedPoly f a -> a #

product :: Num a => WrappedPoly f a -> a #

Foldable (Either e) 
Instance details

Defined in Data.Strict.Either

Methods

fold :: Monoid m => Either e m -> m #

foldMap :: Monoid m => (a -> m) -> Either e a -> m #

foldMap' :: Monoid m => (a -> m) -> Either e a -> m #

foldr :: (a -> b -> b) -> b -> Either e a -> b #

foldr' :: (a -> b -> b) -> b -> Either e a -> b #

foldl :: (b -> a -> b) -> b -> Either e a -> b #

foldl' :: (b -> a -> b) -> b -> Either e a -> b #

foldr1 :: (a -> a -> a) -> Either e a -> a #

foldl1 :: (a -> a -> a) -> Either e a -> a #

toList :: Either e a -> [a] #

null :: Either e a -> Bool #

length :: Either e a -> Int #

elem :: Eq a => a -> Either e a -> Bool #

maximum :: Ord a => Either e a -> a #

minimum :: Ord a => Either e a -> a #

sum :: Num a => Either e a -> a #

product :: Num a => Either e a -> a #

Foldable (These a) 
Instance details

Defined in Data.Strict.These

Methods

fold :: Monoid m => These a m -> m #

foldMap :: Monoid m => (a0 -> m) -> These a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> These a a0 -> m #

foldr :: (a0 -> b -> b) -> b -> These a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> These a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> These a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> These a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> These a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> These a a0 -> a0 #

toList :: These a a0 -> [a0] #

null :: These a a0 -> Bool #

length :: These a a0 -> Int #

elem :: Eq a0 => a0 -> These a a0 -> Bool #

maximum :: Ord a0 => These a a0 -> a0 #

minimum :: Ord a0 => These a a0 -> a0 #

sum :: Num a0 => These a a0 -> a0 #

product :: Num a0 => These a a0 -> a0 #

Foldable (Pair e) 
Instance details

Defined in Data.Strict.Tuple

Methods

fold :: Monoid m => Pair e m -> m #

foldMap :: Monoid m => (a -> m) -> Pair e a -> m #

foldMap' :: Monoid m => (a -> m) -> Pair e a -> m #

foldr :: (a -> b -> b) -> b -> Pair e a -> b #

foldr' :: (a -> b -> b) -> b -> Pair e a -> b #

foldl :: (b -> a -> b) -> b -> Pair e a -> b #

foldl' :: (b -> a -> b) -> b -> Pair e a -> b #

foldr1 :: (a -> a -> a) -> Pair e a -> a #

foldl1 :: (a -> a -> a) -> Pair e a -> a #

toList :: Pair e a -> [a] #

null :: Pair e a -> Bool #

length :: Pair e a -> Int #

elem :: Eq a => a -> Pair e a -> Bool #

maximum :: Ord a => Pair e a -> a #

minimum :: Ord a => Pair e a -> a #

sum :: Num a => Pair e a -> a #

product :: Num a => Pair e a -> a #

Foldable (These a) 
Instance details

Defined in Data.These

Methods

fold :: Monoid m => These a m -> m #

foldMap :: Monoid m => (a0 -> m) -> These a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> These a a0 -> m #

foldr :: (a0 -> b -> b) -> b -> These a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> These a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> These a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> These a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> These a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> These a a0 -> a0 #

toList :: These a a0 -> [a0] #

null :: These a a0 -> Bool #

length :: These a a0 -> Int #

elem :: Eq a0 => a0 -> These a a0 -> Bool #

maximum :: Ord a0 => These a a0 -> a0 #

minimum :: Ord a0 => These a a0 -> a0 #

sum :: Num a0 => These a a0 -> a0 #

product :: Num a0 => These a a0 -> a0 #

Foldable f => Foldable (Lift f) 
Instance details

Defined in Control.Applicative.Lift

Methods

fold :: Monoid m => Lift f m -> m #

foldMap :: Monoid m => (a -> m) -> Lift f a -> m #

foldMap' :: Monoid m => (a -> m) -> Lift f a -> m #

foldr :: (a -> b -> b) -> b -> Lift f a -> b #

foldr' :: (a -> b -> b) -> b -> Lift f a -> b #

foldl :: (b -> a -> b) -> b -> Lift f a -> b #

foldl' :: (b -> a -> b) -> b -> Lift f a -> b #

foldr1 :: (a -> a -> a) -> Lift f a -> a #

foldl1 :: (a -> a -> a) -> Lift f a -> a #

toList :: Lift f a -> [a] #

null :: Lift f a -> Bool #

length :: Lift f a -> Int #

elem :: Eq a => a -> Lift f a -> Bool #

maximum :: Ord a => Lift f a -> a #

minimum :: Ord a => Lift f a -> a #

sum :: Num a => Lift f a -> a #

product :: Num a => Lift f a -> a #

Foldable f => Foldable (ListT f) 
Instance details

Defined in Control.Monad.Trans.List

Methods

fold :: Monoid m => ListT f m -> m #

foldMap :: Monoid m => (a -> m) -> ListT f a -> m #

foldMap' :: Monoid m => (a -> m) -> ListT f a -> m #

foldr :: (a -> b -> b) -> b -> ListT f a -> b #

foldr' :: (a -> b -> b) -> b -> ListT f a -> b #

foldl :: (b -> a -> b) -> b -> ListT f a -> b #

foldl' :: (b -> a -> b) -> b -> ListT f a -> b #

foldr1 :: (a -> a -> a) -> ListT f a -> a #

foldl1 :: (a -> a -> a) -> ListT f a -> a #

toList :: ListT f a -> [a] #

null :: ListT f a -> Bool #

length :: ListT f a -> Int #

elem :: Eq a => a -> ListT f a -> Bool #

maximum :: Ord a => ListT f a -> a #

minimum :: Ord a => ListT f a -> a #

sum :: Num a => ListT f a -> a #

product :: Num a => ListT f a -> a #

Foldable f => Foldable (MaybeT f) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

fold :: Monoid m => MaybeT f m -> m #

foldMap :: Monoid m => (a -> m) -> MaybeT f a -> m #

foldMap' :: Monoid m => (a -> m) -> MaybeT f a -> m #

foldr :: (a -> b -> b) -> b -> MaybeT f a -> b #

foldr' :: (a -> b -> b) -> b -> MaybeT f a -> b #

foldl :: (b -> a -> b) -> b -> MaybeT f a -> b #

foldl' :: (b -> a -> b) -> b -> MaybeT f a -> b #

foldr1 :: (a -> a -> a) -> MaybeT f a -> a #

foldl1 :: (a -> a -> a) -> MaybeT f a -> a #

toList :: MaybeT f a -> [a] #

null :: MaybeT f a -> Bool #

length :: MaybeT f a -> Int #

elem :: Eq a => a -> MaybeT f a -> Bool #

maximum :: Ord a => MaybeT f a -> a #

minimum :: Ord a => MaybeT f a -> a #

sum :: Num a => MaybeT f a -> a #

product :: Num a => MaybeT f a -> a #

Foldable (HashMap k) 
Instance details

Defined in Data.HashMap.Internal

Methods

fold :: Monoid m => HashMap k m -> m #

foldMap :: Monoid m => (a -> m) -> HashMap k a -> m #

foldMap' :: Monoid m => (a -> m) -> HashMap k a -> m #

foldr :: (a -> b -> b) -> b -> HashMap k a -> b #

foldr' :: (a -> b -> b) -> b -> HashMap k a -> b #

foldl :: (b -> a -> b) -> b -> HashMap k a -> b #

foldl' :: (b -> a -> b) -> b -> HashMap k a -> b #

foldr1 :: (a -> a -> a) -> HashMap k a -> a #

foldl1 :: (a -> a -> a) -> HashMap k a -> a #

toList :: HashMap k a -> [a] #

null :: HashMap k a -> Bool #

length :: HashMap k a -> Int #

elem :: Eq a => a -> HashMap k a -> Bool #

maximum :: Ord a => HashMap k a -> a #

minimum :: Ord a => HashMap k a -> a #

sum :: Num a => HashMap k a -> a #

product :: Num a => HashMap k a -> a #

Foldable ((,) a)

Since: base-4.7.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => (a, m) -> m #

foldMap :: Monoid m => (a0 -> m) -> (a, a0) -> m #

foldMap' :: Monoid m => (a0 -> m) -> (a, a0) -> m #

foldr :: (a0 -> b -> b) -> b -> (a, a0) -> b #

foldr' :: (a0 -> b -> b) -> b -> (a, a0) -> b #

foldl :: (b -> a0 -> b) -> b -> (a, a0) -> b #

foldl' :: (b -> a0 -> b) -> b -> (a, a0) -> b #

foldr1 :: (a0 -> a0 -> a0) -> (a, a0) -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> (a, a0) -> a0 #

toList :: (a, a0) -> [a0] #

null :: (a, a0) -> Bool #

length :: (a, a0) -> Int #

elem :: Eq a0 => a0 -> (a, a0) -> Bool #

maximum :: Ord a0 => (a, a0) -> a0 #

minimum :: Ord a0 => (a, a0) -> a0 #

sum :: Num a0 => (a, a0) -> a0 #

product :: Num a0 => (a, a0) -> a0 #

Foldable (Const m :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Functor.Const

Methods

fold :: Monoid m0 => Const m m0 -> m0 #

foldMap :: Monoid m0 => (a -> m0) -> Const m a -> m0 #

foldMap' :: Monoid m0 => (a -> m0) -> Const m a -> m0 #

foldr :: (a -> b -> b) -> b -> Const m a -> b #

foldr' :: (a -> b -> b) -> b -> Const m a -> b #

foldl :: (b -> a -> b) -> b -> Const m a -> b #

foldl' :: (b -> a -> b) -> b -> Const m a -> b #

foldr1 :: (a -> a -> a) -> Const m a -> a #

foldl1 :: (a -> a -> a) -> Const m a -> a #

toList :: Const m a -> [a] #

null :: Const m a -> Bool #

length :: Const m a -> Int #

elem :: Eq a => a -> Const m a -> Bool #

maximum :: Ord a => Const m a -> a #

minimum :: Ord a => Const m a -> a #

sum :: Num a => Const m a -> a #

product :: Num a => Const m a -> a #

Foldable f => Foldable (Ap f)

Since: base-4.12.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Ap f m -> m #

foldMap :: Monoid m => (a -> m) -> Ap f a -> m #

foldMap' :: Monoid m => (a -> m) -> Ap f a -> m #

foldr :: (a -> b -> b) -> b -> Ap f a -> b #

foldr' :: (a -> b -> b) -> b -> Ap f a -> b #

foldl :: (b -> a -> b) -> b -> Ap f a -> b #

foldl' :: (b -> a -> b) -> b -> Ap f a -> b #

foldr1 :: (a -> a -> a) -> Ap f a -> a #

foldl1 :: (a -> a -> a) -> Ap f a -> a #

toList :: Ap f a -> [a] #

null :: Ap f a -> Bool #

length :: Ap f a -> Int #

elem :: Eq a => a -> Ap f a -> Bool #

maximum :: Ord a => Ap f a -> a #

minimum :: Ord a => Ap f a -> a #

sum :: Num a => Ap f a -> a #

product :: Num a => Ap f a -> a #

Foldable f => Foldable (Alt f)

Since: base-4.12.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Alt f m -> m #

foldMap :: Monoid m => (a -> m) -> Alt f a -> m #

foldMap' :: Monoid m => (a -> m) -> Alt f a -> m #

foldr :: (a -> b -> b) -> b -> Alt f a -> b #

foldr' :: (a -> b -> b) -> b -> Alt f a -> b #

foldl :: (b -> a -> b) -> b -> Alt f a -> b #

foldl' :: (b -> a -> b) -> b -> Alt f a -> b #

foldr1 :: (a -> a -> a) -> Alt f a -> a #

foldl1 :: (a -> a -> a) -> Alt f a -> a #

toList :: Alt f a -> [a] #

null :: Alt f a -> Bool #

length :: Alt f a -> Int #

elem :: Eq a => a -> Alt f a -> Bool #

maximum :: Ord a => Alt f a -> a #

minimum :: Ord a => Alt f a -> a #

sum :: Num a => Alt f a -> a #

product :: Num a => Alt f a -> a #

Foldable f => Foldable (Rec1 f)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Rec1 f m -> m #

foldMap :: Monoid m => (a -> m) -> Rec1 f a -> m #

foldMap' :: Monoid m => (a -> m) -> Rec1 f a -> m #

foldr :: (a -> b -> b) -> b -> Rec1 f a -> b #

foldr' :: (a -> b -> b) -> b -> Rec1 f a -> b #

foldl :: (b -> a -> b) -> b -> Rec1 f a -> b #

foldl' :: (b -> a -> b) -> b -> Rec1 f a -> b #

foldr1 :: (a -> a -> a) -> Rec1 f a -> a #

foldl1 :: (a -> a -> a) -> Rec1 f a -> a #

toList :: Rec1 f a -> [a] #

null :: Rec1 f a -> Bool #

length :: Rec1 f a -> Int #

elem :: Eq a => a -> Rec1 f a -> Bool #

maximum :: Ord a => Rec1 f a -> a #

minimum :: Ord a => Rec1 f a -> a #

sum :: Num a => Rec1 f a -> a #

product :: Num a => Rec1 f a -> a #

Bifoldable p => Foldable (Join p) 
Instance details

Defined in Data.Bifunctor.Join

Methods

fold :: Monoid m => Join p m -> m #

foldMap :: Monoid m => (a -> m) -> Join p a -> m #

foldMap' :: Monoid m => (a -> m) -> Join p a -> m #

foldr :: (a -> b -> b) -> b -> Join p a -> b #

foldr' :: (a -> b -> b) -> b -> Join p a -> b #

foldl :: (b -> a -> b) -> b -> Join p a -> b #

foldl' :: (b -> a -> b) -> b -> Join p a -> b #

foldr1 :: (a -> a -> a) -> Join p a -> a #

foldl1 :: (a -> a -> a) -> Join p a -> a #

toList :: Join p a -> [a] #

null :: Join p a -> Bool #

length :: Join p a -> Int #

elem :: Eq a => a -> Join p a -> Bool #

maximum :: Ord a => Join p a -> a #

minimum :: Ord a => Join p a -> a #

sum :: Num a => Join p a -> a #

product :: Num a => Join p a -> a #

Foldable w => Foldable (EnvT e w) 
Instance details

Defined in Control.Comonad.Trans.Env

Methods

fold :: Monoid m => EnvT e w m -> m #

foldMap :: Monoid m => (a -> m) -> EnvT e w a -> m #

foldMap' :: Monoid m => (a -> m) -> EnvT e w a -> m #

foldr :: (a -> b -> b) -> b -> EnvT e w a -> b #

foldr' :: (a -> b -> b) -> b -> EnvT e w a -> b #

foldl :: (b -> a -> b) -> b -> EnvT e w a -> b #

foldl' :: (b -> a -> b) -> b -> EnvT e w a -> b #

foldr1 :: (a -> a -> a) -> EnvT e w a -> a #

foldl1 :: (a -> a -> a) -> EnvT e w a -> a #

toList :: EnvT e w a -> [a] #

null :: EnvT e w a -> Bool #

length :: EnvT e w a -> Int #

elem :: Eq a => a -> EnvT e w a -> Bool #

maximum :: Ord a => EnvT e w a -> a #

minimum :: Ord a => EnvT e w a -> a #

sum :: Num a => EnvT e w a -> a #

product :: Num a => EnvT e w a -> a #

Foldable f => Foldable (FreeF f a) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

fold :: Monoid m => FreeF f a m -> m #

foldMap :: Monoid m => (a0 -> m) -> FreeF f a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> FreeF f a a0 -> m #

foldr :: (a0 -> b -> b) -> b -> FreeF f a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> FreeF f a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> FreeF f a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> FreeF f a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> FreeF f a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> FreeF f a a0 -> a0 #

toList :: FreeF f a a0 -> [a0] #

null :: FreeF f a a0 -> Bool #

length :: FreeF f a a0 -> Int #

elem :: Eq a0 => a0 -> FreeF f a a0 -> Bool #

maximum :: Ord a0 => FreeF f a a0 -> a0 #

minimum :: Ord a0 => FreeF f a a0 -> a0 #

sum :: Num a0 => FreeF f a a0 -> a0 #

product :: Num a0 => FreeF f a a0 -> a0 #

(Foldable m, Foldable f) => Foldable (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

fold :: Monoid m0 => FreeT f m m0 -> m0 #

foldMap :: Monoid m0 => (a -> m0) -> FreeT f m a -> m0 #

foldMap' :: Monoid m0 => (a -> m0) -> FreeT f m a -> m0 #

foldr :: (a -> b -> b) -> b -> FreeT f m a -> b #

foldr' :: (a -> b -> b) -> b -> FreeT f m a -> b #

foldl :: (b -> a -> b) -> b -> FreeT f m a -> b #

foldl' :: (b -> a -> b) -> b -> FreeT f m a -> b #

foldr1 :: (a -> a -> a) -> FreeT f m a -> a #

foldl1 :: (a -> a -> a) -> FreeT f m a -> a #

toList :: FreeT f m a -> [a] #

null :: FreeT f m a -> Bool #

length :: FreeT f m a -> Int #

elem :: Eq a => a -> FreeT f m a -> Bool #

maximum :: Ord a => FreeT f m a -> a #

minimum :: Ord a => FreeT f m a -> a #

sum :: Num a => FreeT f m a -> a #

product :: Num a => FreeT f m a -> a #

Foldable (Tagged s) 
Instance details

Defined in Data.Tagged

Methods

fold :: Monoid m => Tagged s m -> m #

foldMap :: Monoid m => (a -> m) -> Tagged s a -> m #

foldMap' :: Monoid m => (a -> m) -> Tagged s a -> m #

foldr :: (a -> b -> b) -> b -> Tagged s a -> b #

foldr' :: (a -> b -> b) -> b -> Tagged s a -> b #

foldl :: (b -> a -> b) -> b -> Tagged s a -> b #

foldl' :: (b -> a -> b) -> b -> Tagged s a -> b #

foldr1 :: (a -> a -> a) -> Tagged s a -> a #

foldl1 :: (a -> a -> a) -> Tagged s a -> a #

toList :: Tagged s a -> [a] #

null :: Tagged s a -> Bool #

length :: Tagged s a -> Int #

elem :: Eq a => a -> Tagged s a -> Bool #

maximum :: Ord a => Tagged s a -> a #

minimum :: Ord a => Tagged s a -> a #

sum :: Num a => Tagged s a -> a #

product :: Num a => Tagged s a -> a #

(Foldable f, Foldable g) => Foldable (These1 f g) 
Instance details

Defined in Data.Functor.These

Methods

fold :: Monoid m => These1 f g m -> m #

foldMap :: Monoid m => (a -> m) -> These1 f g a -> m #

foldMap' :: Monoid m => (a -> m) -> These1 f g a -> m #

foldr :: (a -> b -> b) -> b -> These1 f g a -> b #

foldr' :: (a -> b -> b) -> b -> These1 f g a -> b #

foldl :: (b -> a -> b) -> b -> These1 f g a -> b #

foldl' :: (b -> a -> b) -> b -> These1 f g a -> b #

foldr1 :: (a -> a -> a) -> These1 f g a -> a #

foldl1 :: (a -> a -> a) -> These1 f g a -> a #

toList :: These1 f g a -> [a] #

null :: These1 f g a -> Bool #

length :: These1 f g a -> Int #

elem :: Eq a => a -> These1 f g a -> Bool #

maximum :: Ord a => These1 f g a -> a #

minimum :: Ord a => These1 f g a -> a #

sum :: Num a => These1 f g a -> a #

product :: Num a => These1 f g a -> a #

Foldable f => Foldable (Backwards f)

Derived instance.

Instance details

Defined in Control.Applicative.Backwards

Methods

fold :: Monoid m => Backwards f m -> m #

foldMap :: Monoid m => (a -> m) -> Backwards f a -> m #

foldMap' :: Monoid m => (a -> m) -> Backwards f a -> m #

foldr :: (a -> b -> b) -> b -> Backwards f a -> b #

foldr' :: (a -> b -> b) -> b -> Backwards f a -> b #

foldl :: (b -> a -> b) -> b -> Backwards f a -> b #

foldl' :: (b -> a -> b) -> b -> Backwards f a -> b #

foldr1 :: (a -> a -> a) -> Backwards f a -> a #

foldl1 :: (a -> a -> a) -> Backwards f a -> a #

toList :: Backwards f a -> [a] #

null :: Backwards f a -> Bool #

length :: Backwards f a -> Int #

elem :: Eq a => a -> Backwards f a -> Bool #

maximum :: Ord a => Backwards f a -> a #

minimum :: Ord a => Backwards f a -> a #

sum :: Num a => Backwards f a -> a #

product :: Num a => Backwards f a -> a #

Foldable f => Foldable (ErrorT e f) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

fold :: Monoid m => ErrorT e f m -> m #

foldMap :: Monoid m => (a -> m) -> ErrorT e f a -> m #

foldMap' :: Monoid m => (a -> m) -> ErrorT e f a -> m #

foldr :: (a -> b -> b) -> b -> ErrorT e f a -> b #

foldr' :: (a -> b -> b) -> b -> ErrorT e f a -> b #

foldl :: (b -> a -> b) -> b -> ErrorT e f a -> b #

foldl' :: (b -> a -> b) -> b -> ErrorT e f a -> b #

foldr1 :: (a -> a -> a) -> ErrorT e f a -> a #

foldl1 :: (a -> a -> a) -> ErrorT e f a -> a #

toList :: ErrorT e f a -> [a] #

null :: ErrorT e f a -> Bool #

length :: ErrorT e f a -> Int #

elem :: Eq a => a -> ErrorT e f a -> Bool #

maximum :: Ord a => ErrorT e f a -> a #

minimum :: Ord a => ErrorT e f a -> a #

sum :: Num a => ErrorT e f a -> a #

product :: Num a => ErrorT e f a -> a #

Foldable f => Foldable (ExceptT e f) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

fold :: Monoid m => ExceptT e f m -> m #

foldMap :: Monoid m => (a -> m) -> ExceptT e f a -> m #

foldMap' :: Monoid m => (a -> m) -> ExceptT e f a -> m #

foldr :: (a -> b -> b) -> b -> ExceptT e f a -> b #

foldr' :: (a -> b -> b) -> b -> ExceptT e f a -> b #

foldl :: (b -> a -> b) -> b -> ExceptT e f a -> b #

foldl' :: (b -> a -> b) -> b -> ExceptT e f a -> b #

foldr1 :: (a -> a -> a) -> ExceptT e f a -> a #

foldl1 :: (a -> a -> a) -> ExceptT e f a -> a #

toList :: ExceptT e f a -> [a] #

null :: ExceptT e f a -> Bool #

length :: ExceptT e f a -> Int #

elem :: Eq a => a -> ExceptT e f a -> Bool #

maximum :: Ord a => ExceptT e f a -> a #

minimum :: Ord a => ExceptT e f a -> a #

sum :: Num a => ExceptT e f a -> a #

product :: Num a => ExceptT e f a -> a #

Foldable f => Foldable (IdentityT f) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

fold :: Monoid m => IdentityT f m -> m #

foldMap :: Monoid m => (a -> m) -> IdentityT f a -> m #

foldMap' :: Monoid m => (a -> m) -> IdentityT f a -> m #

foldr :: (a -> b -> b) -> b -> IdentityT f a -> b #

foldr' :: (a -> b -> b) -> b -> IdentityT f a -> b #

foldl :: (b -> a -> b) -> b -> IdentityT f a -> b #

foldl' :: (b -> a -> b) -> b -> IdentityT f a -> b #

foldr1 :: (a -> a -> a) -> IdentityT f a -> a #

foldl1 :: (a -> a -> a) -> IdentityT f a -> a #

toList :: IdentityT f a -> [a] #

null :: IdentityT f a -> Bool #

length :: IdentityT f a -> Int #

elem :: Eq a => a -> IdentityT f a -> Bool #

maximum :: Ord a => IdentityT f a -> a #

minimum :: Ord a => IdentityT f a -> a #

sum :: Num a => IdentityT f a -> a #

product :: Num a => IdentityT f a -> a #

Foldable f => Foldable (WriterT w f) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

fold :: Monoid m => WriterT w f m -> m #

foldMap :: Monoid m => (a -> m) -> WriterT w f a -> m #

foldMap' :: Monoid m => (a -> m) -> WriterT w f a -> m #

foldr :: (a -> b -> b) -> b -> WriterT w f a -> b #

foldr' :: (a -> b -> b) -> b -> WriterT w f a -> b #

foldl :: (b -> a -> b) -> b -> WriterT w f a -> b #

foldl' :: (b -> a -> b) -> b -> WriterT w f a -> b #

foldr1 :: (a -> a -> a) -> WriterT w f a -> a #

foldl1 :: (a -> a -> a) -> WriterT w f a -> a #

toList :: WriterT w f a -> [a] #

null :: WriterT w f a -> Bool #

length :: WriterT w f a -> Int #

elem :: Eq a => a -> WriterT w f a -> Bool #

maximum :: Ord a => WriterT w f a -> a #

minimum :: Ord a => WriterT w f a -> a #

sum :: Num a => WriterT w f a -> a #

product :: Num a => WriterT w f a -> a #

Foldable f => Foldable (WriterT w f) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

fold :: Monoid m => WriterT w f m -> m #

foldMap :: Monoid m => (a -> m) -> WriterT w f a -> m #

foldMap' :: Monoid m => (a -> m) -> WriterT w f a -> m #

foldr :: (a -> b -> b) -> b -> WriterT w f a -> b #

foldr' :: (a -> b -> b) -> b -> WriterT w f a -> b #

foldl :: (b -> a -> b) -> b -> WriterT w f a -> b #

foldl' :: (b -> a -> b) -> b -> WriterT w f a -> b #

foldr1 :: (a -> a -> a) -> WriterT w f a -> a #

foldl1 :: (a -> a -> a) -> WriterT w f a -> a #

toList :: WriterT w f a -> [a] #

null :: WriterT w f a -> Bool #

length :: WriterT w f a -> Int #

elem :: Eq a => a -> WriterT w f a -> Bool #

maximum :: Ord a => WriterT w f a -> a #

minimum :: Ord a => WriterT w f a -> a #

sum :: Num a => WriterT w f a -> a #

product :: Num a => WriterT w f a -> a #

Foldable (Constant a :: Type -> Type) 
Instance details

Defined in Data.Functor.Constant

Methods

fold :: Monoid m => Constant a m -> m #

foldMap :: Monoid m => (a0 -> m) -> Constant a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> Constant a a0 -> m #

foldr :: (a0 -> b -> b) -> b -> Constant a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Constant a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> Constant a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> Constant a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Constant a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> Constant a a0 -> a0 #

toList :: Constant a a0 -> [a0] #

null :: Constant a a0 -> Bool #

length :: Constant a a0 -> Int #

elem :: Eq a0 => a0 -> Constant a a0 -> Bool #

maximum :: Ord a0 => Constant a a0 -> a0 #

minimum :: Ord a0 => Constant a a0 -> a0 #

sum :: Num a0 => Constant a a0 -> a0 #

product :: Num a0 => Constant a a0 -> a0 #

Foldable f => Foldable (Reverse f)

Fold from right to left.

Instance details

Defined in Data.Functor.Reverse

Methods

fold :: Monoid m => Reverse f m -> m #

foldMap :: Monoid m => (a -> m) -> Reverse f a -> m #

foldMap' :: Monoid m => (a -> m) -> Reverse f a -> m #

foldr :: (a -> b -> b) -> b -> Reverse f a -> b #

foldr' :: (a -> b -> b) -> b -> Reverse f a -> b #

foldl :: (b -> a -> b) -> b -> Reverse f a -> b #

foldl' :: (b -> a -> b) -> b -> Reverse f a -> b #

foldr1 :: (a -> a -> a) -> Reverse f a -> a #

foldl1 :: (a -> a -> a) -> Reverse f a -> a #

toList :: Reverse f a -> [a] #

null :: Reverse f a -> Bool #

length :: Reverse f a -> Int #

elem :: Eq a => a -> Reverse f a -> Bool #

maximum :: Ord a => Reverse f a -> a #

minimum :: Ord a => Reverse f a -> a #

sum :: Num a => Reverse f a -> a #

product :: Num a => Reverse f a -> a #

(Foldable f, Foldable g) => Foldable (Product f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Product

Methods

fold :: Monoid m => Product f g m -> m #

foldMap :: Monoid m => (a -> m) -> Product f g a -> m #

foldMap' :: Monoid m => (a -> m) -> Product f g a -> m #

foldr :: (a -> b -> b) -> b -> Product f g a -> b #

foldr' :: (a -> b -> b) -> b -> Product f g a -> b #

foldl :: (b -> a -> b) -> b -> Product f g a -> b #

foldl' :: (b -> a -> b) -> b -> Product f g a -> b #

foldr1 :: (a -> a -> a) -> Product f g a -> a #

foldl1 :: (a -> a -> a) -> Product f g a -> a #

toList :: Product f g a -> [a] #

null :: Product f g a -> Bool #

length :: Product f g a -> Int #

elem :: Eq a => a -> Product f g a -> Bool #

maximum :: Ord a => Product f g a -> a #

minimum :: Ord a => Product f g a -> a #

sum :: Num a => Product f g a -> a #

product :: Num a => Product f g a -> a #

(Foldable f, Foldable g) => Foldable (Sum f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Sum

Methods

fold :: Monoid m => Sum f g m -> m #

foldMap :: Monoid m => (a -> m) -> Sum f g a -> m #

foldMap' :: Monoid m => (a -> m) -> Sum f g a -> m #

foldr :: (a -> b -> b) -> b -> Sum f g a -> b #

foldr' :: (a -> b -> b) -> b -> Sum f g a -> b #

foldl :: (b -> a -> b) -> b -> Sum f g a -> b #

foldl' :: (b -> a -> b) -> b -> Sum f g a -> b #

foldr1 :: (a -> a -> a) -> Sum f g a -> a #

foldl1 :: (a -> a -> a) -> Sum f g a -> a #

toList :: Sum f g a -> [a] #

null :: Sum f g a -> Bool #

length :: Sum f g a -> Int #

elem :: Eq a => a -> Sum f g a -> Bool #

maximum :: Ord a => Sum f g a -> a #

minimum :: Ord a => Sum f g a -> a #

sum :: Num a => Sum f g a -> a #

product :: Num a => Sum f g a -> a #

(Foldable f, Foldable g) => Foldable (f :*: g)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => (f :*: g) m -> m #

foldMap :: Monoid m => (a -> m) -> (f :*: g) a -> m #

foldMap' :: Monoid m => (a -> m) -> (f :*: g) a -> m #

foldr :: (a -> b -> b) -> b -> (f :*: g) a -> b #

foldr' :: (a -> b -> b) -> b -> (f :*: g) a -> b #

foldl :: (b -> a -> b) -> b -> (f :*: g) a -> b #

foldl' :: (b -> a -> b) -> b -> (f :*: g) a -> b #

foldr1 :: (a -> a -> a) -> (f :*: g) a -> a #

foldl1 :: (a -> a -> a) -> (f :*: g) a -> a #

toList :: (f :*: g) a -> [a] #

null :: (f :*: g) a -> Bool #

length :: (f :*: g) a -> Int #

elem :: Eq a => a -> (f :*: g) a -> Bool #

maximum :: Ord a => (f :*: g) a -> a #

minimum :: Ord a => (f :*: g) a -> a #

sum :: Num a => (f :*: g) a -> a #

product :: Num a => (f :*: g) a -> a #

(Foldable f, Foldable g) => Foldable (f :+: g)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => (f :+: g) m -> m #

foldMap :: Monoid m => (a -> m) -> (f :+: g) a -> m #

foldMap' :: Monoid m => (a -> m) -> (f :+: g) a -> m #

foldr :: (a -> b -> b) -> b -> (f :+: g) a -> b #

foldr' :: (a -> b -> b) -> b -> (f :+: g) a -> b #

foldl :: (b -> a -> b) -> b -> (f :+: g) a -> b #

foldl' :: (b -> a -> b) -> b -> (f :+: g) a -> b #

foldr1 :: (a -> a -> a) -> (f :+: g) a -> a #

foldl1 :: (a -> a -> a) -> (f :+: g) a -> a #

toList :: (f :+: g) a -> [a] #

null :: (f :+: g) a -> Bool #

length :: (f :+: g) a -> Int #

elem :: Eq a => a -> (f :+: g) a -> Bool #

maximum :: Ord a => (f :+: g) a -> a #

minimum :: Ord a => (f :+: g) a -> a #

sum :: Num a => (f :+: g) a -> a #

product :: Num a => (f :+: g) a -> a #

Foldable (K1 i c :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => K1 i c m -> m #

foldMap :: Monoid m => (a -> m) -> K1 i c a -> m #

foldMap' :: Monoid m => (a -> m) -> K1 i c a -> m #

foldr :: (a -> b -> b) -> b -> K1 i c a -> b #

foldr' :: (a -> b -> b) -> b -> K1 i c a -> b #

foldl :: (b -> a -> b) -> b -> K1 i c a -> b #

foldl' :: (b -> a -> b) -> b -> K1 i c a -> b #

foldr1 :: (a -> a -> a) -> K1 i c a -> a #

foldl1 :: (a -> a -> a) -> K1 i c a -> a #

toList :: K1 i c a -> [a] #

null :: K1 i c a -> Bool #

length :: K1 i c a -> Int #

elem :: Eq a => a -> K1 i c a -> Bool #

maximum :: Ord a => K1 i c a -> a #

minimum :: Ord a => K1 i c a -> a #

sum :: Num a => K1 i c a -> a #

product :: Num a => K1 i c a -> a #

(Foldable f, Foldable g) => Foldable (Compose f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

fold :: Monoid m => Compose f g m -> m #

foldMap :: Monoid m => (a -> m) -> Compose f g a -> m #

foldMap' :: Monoid m => (a -> m) -> Compose f g a -> m #

foldr :: (a -> b -> b) -> b -> Compose f g a -> b #

foldr' :: (a -> b -> b) -> b -> Compose f g a -> b #

foldl :: (b -> a -> b) -> b -> Compose f g a -> b #

foldl' :: (b -> a -> b) -> b -> Compose f g a -> b #

foldr1 :: (a -> a -> a) -> Compose f g a -> a #

foldl1 :: (a -> a -> a) -> Compose f g a -> a #

toList :: Compose f g a -> [a] #

null :: Compose f g a -> Bool #

length :: Compose f g a -> Int #

elem :: Eq a => a -> Compose f g a -> Bool #

maximum :: Ord a => Compose f g a -> a #

minimum :: Ord a => Compose f g a -> a #

sum :: Num a => Compose f g a -> a #

product :: Num a => Compose f g a -> a #

(Foldable f, Foldable g) => Foldable (f :.: g)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => (f :.: g) m -> m #

foldMap :: Monoid m => (a -> m) -> (f :.: g) a -> m #

foldMap' :: Monoid m => (a -> m) -> (f :.: g) a -> m #

foldr :: (a -> b -> b) -> b -> (f :.: g) a -> b #

foldr' :: (a -> b -> b) -> b -> (f :.: g) a -> b #

foldl :: (b -> a -> b) -> b -> (f :.: g) a -> b #

foldl' :: (b -> a -> b) -> b -> (f :.: g) a -> b #

foldr1 :: (a -> a -> a) -> (f :.: g) a -> a #

foldl1 :: (a -> a -> a) -> (f :.: g) a -> a #

toList :: (f :.: g) a -> [a] #

null :: (f :.: g) a -> Bool #

length :: (f :.: g) a -> Int #

elem :: Eq a => a -> (f :.: g) a -> Bool #

maximum :: Ord a => (f :.: g) a -> a #

minimum :: Ord a => (f :.: g) a -> a #

sum :: Num a => (f :.: g) a -> a #

product :: Num a => (f :.: g) a -> a #

Foldable f => Foldable (M1 i c f)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => M1 i c f m -> m #

foldMap :: Monoid m => (a -> m) -> M1 i c f a -> m #

foldMap' :: Monoid m => (a -> m) -> M1 i c f a -> m #

foldr :: (a -> b -> b) -> b -> M1 i c f a -> b #

foldr' :: (a -> b -> b) -> b -> M1 i c f a -> b #

foldl :: (b -> a -> b) -> b -> M1 i c f a -> b #

foldl' :: (b -> a -> b) -> b -> M1 i c f a -> b #

foldr1 :: (a -> a -> a) -> M1 i c f a -> a #

foldl1 :: (a -> a -> a) -> M1 i c f a -> a #

toList :: M1 i c f a -> [a] #

null :: M1 i c f a -> Bool #

length :: M1 i c f a -> Int #

elem :: Eq a => a -> M1 i c f a -> Bool #

maximum :: Ord a => M1 i c f a -> a #

minimum :: Ord a => M1 i c f a -> a #

sum :: Num a => M1 i c f a -> a #

product :: Num a => M1 i c f a -> a #

Foldable (Clown f a :: Type -> Type) 
Instance details

Defined in Data.Bifunctor.Clown

Methods

fold :: Monoid m => Clown f a m -> m #

foldMap :: Monoid m => (a0 -> m) -> Clown f a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> Clown f a a0 -> m #

foldr :: (a0 -> b -> b) -> b -> Clown f a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Clown f a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> Clown f a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> Clown f a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Clown f a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> Clown f a a0 -> a0 #

toList :: Clown f a a0 -> [a0] #

null :: Clown f a a0 -> Bool #

length :: Clown f a a0 -> Int #

elem :: Eq a0 => a0 -> Clown f a a0 -> Bool #

maximum :: Ord a0 => Clown f a a0 -> a0 #

minimum :: Ord a0 => Clown f a a0 -> a0 #

sum :: Num a0 => Clown f a a0 -> a0 #

product :: Num a0 => Clown f a a0 -> a0 #

Bifoldable p => Foldable (Flip p a) 
Instance details

Defined in Data.Bifunctor.Flip

Methods

fold :: Monoid m => Flip p a m -> m #

foldMap :: Monoid m => (a0 -> m) -> Flip p a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> Flip p a a0 -> m #

foldr :: (a0 -> b -> b) -> b -> Flip p a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Flip p a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> Flip p a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> Flip p a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Flip p a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> Flip p a a0 -> a0 #

toList :: Flip p a a0 -> [a0] #

null :: Flip p a a0 -> Bool #

length :: Flip p a a0 -> Int #

elem :: Eq a0 => a0 -> Flip p a a0 -> Bool #

maximum :: Ord a0 => Flip p a a0 -> a0 #

minimum :: Ord a0 => Flip p a a0 -> a0 #

sum :: Num a0 => Flip p a a0 -> a0 #

product :: Num a0 => Flip p a a0 -> a0 #

Foldable g => Foldable (Joker g a) 
Instance details

Defined in Data.Bifunctor.Joker

Methods

fold :: Monoid m => Joker g a m -> m #

foldMap :: Monoid m => (a0 -> m) -> Joker g a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> Joker g a a0 -> m #

foldr :: (a0 -> b -> b) -> b -> Joker g a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Joker g a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> Joker g a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> Joker g a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Joker g a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> Joker g a a0 -> a0 #

toList :: Joker g a a0 -> [a0] #

null :: Joker g a a0 -> Bool #

length :: Joker g a a0 -> Int #

elem :: Eq a0 => a0 -> Joker g a a0 -> Bool #

maximum :: Ord a0 => Joker g a a0 -> a0 #

minimum :: Ord a0 => Joker g a a0 -> a0 #

sum :: Num a0 => Joker g a a0 -> a0 #

product :: Num a0 => Joker g a a0 -> a0 #

Bifoldable p => Foldable (WrappedBifunctor p a) 
Instance details

Defined in Data.Bifunctor.Wrapped

Methods

fold :: Monoid m => WrappedBifunctor p a m -> m #

foldMap :: Monoid m => (a0 -> m) -> WrappedBifunctor p a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> WrappedBifunctor p a a0 -> m #

foldr :: (a0 -> b -> b) -> b -> WrappedBifunctor p a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> WrappedBifunctor p a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> WrappedBifunctor p a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> WrappedBifunctor p a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> WrappedBifunctor p a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> WrappedBifunctor p a a0 -> a0 #

toList :: WrappedBifunctor p a a0 -> [a0] #

null :: WrappedBifunctor p a a0 -> Bool #

length :: WrappedBifunctor p a a0 -> Int #

elem :: Eq a0 => a0 -> WrappedBifunctor p a a0 -> Bool #

maximum :: Ord a0 => WrappedBifunctor p a a0 -> a0 #

minimum :: Ord a0 => WrappedBifunctor p a a0 -> a0 #

sum :: Num a0 => WrappedBifunctor p a a0 -> a0 #

product :: Num a0 => WrappedBifunctor p a a0 -> a0 #

(Foldable f, Bifoldable p) => Foldable (Tannen f p a) 
Instance details

Defined in Data.Bifunctor.Tannen

Methods

fold :: Monoid m => Tannen f p a m -> m #

foldMap :: Monoid m => (a0 -> m) -> Tannen f p a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> Tannen f p a a0 -> m #

foldr :: (a0 -> b -> b) -> b -> Tannen f p a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Tannen f p a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> Tannen f p a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> Tannen f p a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Tannen f p a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> Tannen f p a a0 -> a0 #

toList :: Tannen f p a a0 -> [a0] #

null :: Tannen f p a a0 -> Bool #

length :: Tannen f p a a0 -> Int #

elem :: Eq a0 => a0 -> Tannen f p a a0 -> Bool #

maximum :: Ord a0 => Tannen f p a a0 -> a0 #

minimum :: Ord a0 => Tannen f p a a0 -> a0 #

sum :: Num a0 => Tannen f p a a0 -> a0 #

product :: Num a0 => Tannen f p a a0 -> a0 #

(Bifoldable p, Foldable g) => Foldable (Biff p f g a) 
Instance details

Defined in Data.Bifunctor.Biff

Methods

fold :: Monoid m => Biff p f g a m -> m #

foldMap :: Monoid m => (a0 -> m) -> Biff p f g a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> Biff p f g a a0 -> m #

foldr :: (a0 -> b -> b) -> b -> Biff p f g a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Biff p f g a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> Biff p f g a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> Biff p f g a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Biff p f g a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> Biff p f g a a0 -> a0 #

toList :: Biff p f g a a0 -> [a0] #

null :: Biff p f g a a0 -> Bool #

length :: Biff p f g a a0 -> Int #

elem :: Eq a0 => a0 -> Biff p f g a a0 -> Bool #

maximum :: Ord a0 => Biff p f g a a0 -> a0 #

minimum :: Ord a0 => Biff p f g a a0 -> a0 #

sum :: Num a0 => Biff p f g a a0 -> a0 #

product :: Num a0 => Biff p f g a a0 -> a0 #

class (Functor t, Foldable t) => Traversable (t :: Type -> Type) where #

Functors representing data structures that can be transformed to structures of the same shape by performing an Applicative (or, therefore, Monad) action on each element from left to right.

A more detailed description of what same shape means, the various methods, how traversals are constructed, and example advanced use-cases can be found in the Overview section of Data.Traversable.

For the class laws see the Laws section of Data.Traversable.

Minimal complete definition

traverse | sequenceA

Methods

traverse :: Applicative f => (a -> f b) -> t a -> f (t b) #

Map each element of a structure to an action, evaluate these actions from left to right, and collect the results. For a version that ignores the results see traverse_.

Examples

Expand

Basic usage:

In the first two examples we show each evaluated action mapping to the output structure.

>>> traverse Just [1,2,3,4]
Just [1,2,3,4]
>>> traverse id [Right 1, Right 2, Right 3, Right 4]
Right [1,2,3,4]

In the next examples, we show that Nothing and Left values short circuit the created structure.

>>> traverse (const Nothing) [1,2,3,4]
Nothing
>>> traverse (\x -> if odd x then Just x else Nothing)  [1,2,3,4]
Nothing
>>> traverse id [Right 1, Right 2, Right 3, Right 4, Left 0]
Left 0

sequenceA :: Applicative f => t (f a) -> f (t a) #

Evaluate each action in the structure from left to right, and collect the results. For a version that ignores the results see sequenceA_.

Examples

Expand

Basic usage:

For the first two examples we show sequenceA fully evaluating a a structure and collecting the results.

>>> sequenceA [Just 1, Just 2, Just 3]
Just [1,2,3]
>>> sequenceA [Right 1, Right 2, Right 3]
Right [1,2,3]

The next two example show Nothing and Just will short circuit the resulting structure if present in the input. For more context, check the Traversable instances for Either and Maybe.

>>> sequenceA [Just 1, Just 2, Just 3, Nothing]
Nothing
>>> sequenceA [Right 1, Right 2, Right 3, Left 4]
Left 4

mapM :: Monad m => (a -> m b) -> t a -> m (t b) #

Map each element of a structure to a monadic action, evaluate these actions from left to right, and collect the results. For a version that ignores the results see mapM_.

Examples

Expand

mapM is literally a traverse with a type signature restricted to Monad. Its implementation may be more efficient due to additional power of Monad.

sequence :: Monad m => t (m a) -> m (t a) #

Evaluate each monadic action in the structure from left to right, and collect the results. For a version that ignores the results see sequence_.

Examples

Expand

Basic usage:

The first two examples are instances where the input and and output of sequence are isomorphic.

>>> sequence $ Right [1,2,3,4]
[Right 1,Right 2,Right 3,Right 4]
>>> sequence $ [Right 1,Right 2,Right 3,Right 4]
Right [1,2,3,4]

The following examples demonstrate short circuit behavior for sequence.

>>> sequence $ Left [1,2,3,4]
Left [1,2,3,4]
>>> sequence $ [Left 0, Right 1,Right 2,Right 3,Right 4]
Left 0

Instances

Instances details
Traversable IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

traverse :: Applicative f => (a -> f b) -> IResult a -> f (IResult b) #

sequenceA :: Applicative f => IResult (f a) -> f (IResult a) #

mapM :: Monad m => (a -> m b) -> IResult a -> m (IResult b) #

sequence :: Monad m => IResult (m a) -> m (IResult a) #

Traversable Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

traverse :: Applicative f => (a -> f b) -> Result a -> f (Result b) #

sequenceA :: Applicative f => Result (f a) -> f (Result a) #

mapM :: Monad m => (a -> m b) -> Result a -> m (Result b) #

sequence :: Monad m => Result (m a) -> m (Result a) #

Traversable ZipList

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> ZipList a -> f (ZipList b) #

sequenceA :: Applicative f => ZipList (f a) -> f (ZipList a) #

mapM :: Monad m => (a -> m b) -> ZipList a -> m (ZipList b) #

sequence :: Monad m => ZipList (m a) -> m (ZipList a) #

Traversable Complex

Since: base-4.9.0.0

Instance details

Defined in Data.Complex

Methods

traverse :: Applicative f => (a -> f b) -> Complex a -> f (Complex b) #

sequenceA :: Applicative f => Complex (f a) -> f (Complex a) #

mapM :: Monad m => (a -> m b) -> Complex a -> m (Complex b) #

sequence :: Monad m => Complex (m a) -> m (Complex a) #

Traversable Identity

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Identity a -> f (Identity b) #

sequenceA :: Applicative f => Identity (f a) -> f (Identity a) #

mapM :: Monad m => (a -> m b) -> Identity a -> m (Identity b) #

sequence :: Monad m => Identity (m a) -> m (Identity a) #

Traversable First

Since: base-4.8.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> First a -> f (First b) #

sequenceA :: Applicative f => First (f a) -> f (First a) #

mapM :: Monad m => (a -> m b) -> First a -> m (First b) #

sequence :: Monad m => First (m a) -> m (First a) #

Traversable Last

Since: base-4.8.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Last a -> f (Last b) #

sequenceA :: Applicative f => Last (f a) -> f (Last a) #

mapM :: Monad m => (a -> m b) -> Last a -> m (Last b) #

sequence :: Monad m => Last (m a) -> m (Last a) #

Traversable Down

Since: base-4.12.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Down a -> f (Down b) #

sequenceA :: Applicative f => Down (f a) -> f (Down a) #

mapM :: Monad m => (a -> m b) -> Down a -> m (Down b) #

sequence :: Monad m => Down (m a) -> m (Down a) #

Traversable First

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

traverse :: Applicative f => (a -> f b) -> First a -> f (First b) #

sequenceA :: Applicative f => First (f a) -> f (First a) #

mapM :: Monad m => (a -> m b) -> First a -> m (First b) #

sequence :: Monad m => First (m a) -> m (First a) #

Traversable Last

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

traverse :: Applicative f => (a -> f b) -> Last a -> f (Last b) #

sequenceA :: Applicative f => Last (f a) -> f (Last a) #

mapM :: Monad m => (a -> m b) -> Last a -> m (Last b) #

sequence :: Monad m => Last (m a) -> m (Last a) #

Traversable Max

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

traverse :: Applicative f => (a -> f b) -> Max a -> f (Max b) #

sequenceA :: Applicative f => Max (f a) -> f (Max a) #

mapM :: Monad m => (a -> m b) -> Max a -> m (Max b) #

sequence :: Monad m => Max (m a) -> m (Max a) #

Traversable Min

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

traverse :: Applicative f => (a -> f b) -> Min a -> f (Min b) #

sequenceA :: Applicative f => Min (f a) -> f (Min a) #

mapM :: Monad m => (a -> m b) -> Min a -> m (Min b) #

sequence :: Monad m => Min (m a) -> m (Min a) #

Traversable 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 Dual

Since: base-4.8.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Dual a -> f (Dual b) #

sequenceA :: Applicative f => Dual (f a) -> f (Dual a) #

mapM :: Monad m => (a -> m b) -> Dual a -> m (Dual b) #

sequence :: Monad m => Dual (m a) -> m (Dual a) #

Traversable Product

Since: base-4.8.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Product a -> f (Product b) #

sequenceA :: Applicative f => Product (f a) -> f (Product a) #

mapM :: Monad m => (a -> m b) -> Product a -> m (Product b) #

sequence :: Monad m => Product (m a) -> m (Product a) #

Traversable Sum

Since: base-4.8.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Sum a -> f (Sum b) #

sequenceA :: Applicative f => Sum (f a) -> f (Sum a) #

mapM :: Monad m => (a -> m b) -> Sum a -> m (Sum b) #

sequence :: Monad m => Sum (m a) -> m (Sum a) #

Traversable 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 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 Identifier 
Instance details

Defined in Text.Casing

Methods

traverse :: Applicative f => (a -> f b) -> Identifier a -> f (Identifier b) #

sequenceA :: Applicative f => Identifier (f a) -> f (Identifier a) #

mapM :: Monad m => (a -> m b) -> Identifier a -> m (Identifier b) #

sequence :: Monad m => Identifier (m a) -> m (Identifier a) #

Traversable IntMap

Traverses in order of increasing key.

Instance details

Defined in Data.IntMap.Internal

Methods

traverse :: Applicative f => (a -> f b) -> IntMap a -> f (IntMap b) #

sequenceA :: Applicative f => IntMap (f a) -> f (IntMap a) #

mapM :: Monad m => (a -> m b) -> IntMap a -> m (IntMap b) #

sequence :: Monad m => IntMap (m a) -> m (IntMap a) #

Traversable Digit 
Instance details

Defined in Data.Sequence.Internal

Methods

traverse :: Applicative f => (a -> f b) -> Digit a -> f (Digit b) #

sequenceA :: Applicative f => Digit (f a) -> f (Digit a) #

mapM :: Monad m => (a -> m b) -> Digit a -> m (Digit b) #

sequence :: Monad m => Digit (m a) -> m (Digit a) #

Traversable Elem 
Instance details

Defined in Data.Sequence.Internal

Methods

traverse :: Applicative f => (a -> f b) -> Elem a -> f (Elem b) #

sequenceA :: Applicative f => Elem (f a) -> f (Elem a) #

mapM :: Monad m => (a -> m b) -> Elem a -> m (Elem b) #

sequence :: Monad m => Elem (m a) -> m (Elem a) #

Traversable FingerTree 
Instance details

Defined in Data.Sequence.Internal

Methods

traverse :: Applicative f => (a -> f b) -> FingerTree a -> f (FingerTree b) #

sequenceA :: Applicative f => FingerTree (f a) -> f (FingerTree a) #

mapM :: Monad m => (a -> m b) -> FingerTree a -> m (FingerTree b) #

sequence :: Monad m => FingerTree (m a) -> m (FingerTree a) #

Traversable Node 
Instance details

Defined in Data.Sequence.Internal

Methods

traverse :: Applicative f => (a -> f b) -> Node a -> f (Node b) #

sequenceA :: Applicative f => Node (f a) -> f (Node a) #

mapM :: Monad m => (a -> m b) -> Node a -> m (Node b) #

sequence :: Monad m => Node (m a) -> m (Node a) #

Traversable Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

traverse :: Applicative f => (a -> f b) -> Seq a -> f (Seq b) #

sequenceA :: Applicative f => Seq (f a) -> f (Seq a) #

mapM :: Monad m => (a -> m b) -> Seq a -> m (Seq b) #

sequence :: Monad m => Seq (m a) -> m (Seq a) #

Traversable ViewL 
Instance details

Defined in Data.Sequence.Internal

Methods

traverse :: Applicative f => (a -> f b) -> ViewL a -> f (ViewL b) #

sequenceA :: Applicative f => ViewL (f a) -> f (ViewL a) #

mapM :: Monad m => (a -> m b) -> ViewL a -> m (ViewL b) #

sequence :: Monad m => ViewL (m a) -> m (ViewL a) #

Traversable ViewR 
Instance details

Defined in Data.Sequence.Internal

Methods

traverse :: Applicative f => (a -> f b) -> ViewR a -> f (ViewR b) #

sequenceA :: Applicative f => ViewR (f a) -> f (ViewR a) #

mapM :: Monad m => (a -> m b) -> ViewR a -> m (ViewR b) #

sequence :: Monad m => ViewR (m a) -> m (ViewR a) #

Traversable Tree 
Instance details

Defined in Data.Tree

Methods

traverse :: Applicative f => (a -> f b) -> Tree a -> f (Tree b) #

sequenceA :: Applicative f => Tree (f a) -> f (Tree a) #

mapM :: Monad m => (a -> m b) -> Tree a -> m (Tree b) #

sequence :: Monad m => Tree (m a) -> m (Tree a) #

Traversable DList 
Instance details

Defined in Data.DList.Internal

Methods

traverse :: Applicative f => (a -> f b) -> DList a -> f (DList b) #

sequenceA :: Applicative f => DList (f a) -> f (DList a) #

mapM :: Monad m => (a -> m b) -> DList a -> m (DList b) #

sequence :: Monad m => DList (m a) -> m (DList a) #

Traversable LenientData 
Instance details

Defined in Web.Internal.HttpApiData

Methods

traverse :: Applicative f => (a -> f b) -> LenientData a -> f (LenientData b) #

sequenceA :: Applicative f => LenientData (f a) -> f (LenientData a) #

mapM :: Monad m => (a -> m b) -> LenientData a -> m (LenientData b) #

sequence :: Monad m => LenientData (m a) -> m (LenientData a) #

Traversable HistoriedResponse 
Instance details

Defined in Network.HTTP.Client

Methods

traverse :: Applicative f => (a -> f b) -> HistoriedResponse a -> f (HistoriedResponse b) #

sequenceA :: Applicative f => HistoriedResponse (f a) -> f (HistoriedResponse a) #

mapM :: Monad m => (a -> m b) -> HistoriedResponse a -> m (HistoriedResponse b) #

sequence :: Monad m => HistoriedResponse (m a) -> m (HistoriedResponse a) #

Traversable Response 
Instance details

Defined in Network.HTTP.Client.Types

Methods

traverse :: Applicative f => (a -> f b) -> Response a -> f (Response b) #

sequenceA :: Applicative f => Response (f a) -> f (Response a) #

mapM :: Monad m => (a -> m b) -> Response a -> m (Response b) #

sequence :: Monad m => Response (m a) -> m (Response a) #

Traversable SimpleDocStream

Transform a document based on its annotations, possibly leveraging Applicative effects.

Instance details

Defined in Prettyprinter.Internal

Methods

traverse :: Applicative f => (a -> f b) -> SimpleDocStream a -> f (SimpleDocStream b) #

sequenceA :: Applicative f => SimpleDocStream (f a) -> f (SimpleDocStream a) #

mapM :: Monad m => (a -> m b) -> SimpleDocStream a -> m (SimpleDocStream b) #

sequence :: Monad m => SimpleDocStream (m a) -> m (SimpleDocStream a) #

Traversable Array 
Instance details

Defined in Data.Primitive.Array

Methods

traverse :: Applicative f => (a -> f b) -> Array a -> f (Array b) #

sequenceA :: Applicative f => Array (f a) -> f (Array a) #

mapM :: Monad m => (a -> m b) -> Array a -> m (Array b) #

sequence :: Monad m => Array (m a) -> m (Array a) #

Traversable SmallArray 
Instance details

Defined in Data.Primitive.SmallArray

Methods

traverse :: Applicative f => (a -> f b) -> SmallArray a -> f (SmallArray b) #

sequenceA :: Applicative f => SmallArray (f a) -> f (SmallArray a) #

mapM :: Monad m => (a -> m b) -> SmallArray a -> m (SmallArray b) #

sequence :: Monad m => SmallArray (m a) -> m (SmallArray a) #

Traversable 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 Maybe 
Instance details

Defined in Data.Strict.Maybe

Methods

traverse :: Applicative f => (a -> f b) -> Maybe a -> f (Maybe b) #

sequenceA :: Applicative f => Maybe (f a) -> f (Maybe a) #

mapM :: Monad m => (a -> m b) -> Maybe a -> m (Maybe b) #

sequence :: Monad m => Maybe (m a) -> m (Maybe a) #

Traversable Vector 
Instance details

Defined in Data.Vector

Methods

traverse :: Applicative f => (a -> f b) -> Vector a -> f (Vector b) #

sequenceA :: Applicative f => Vector (f a) -> f (Vector a) #

mapM :: Monad m => (a -> m b) -> Vector a -> m (Vector b) #

sequence :: Monad m => Vector (m a) -> m (Vector a) #

Traversable FormResult

Since: yesod-form-1.4.5

Instance details

Defined in Yesod.Form.Types

Methods

traverse :: Applicative f => (a -> f b) -> FormResult a -> f (FormResult b) #

sequenceA :: Applicative f => FormResult (f a) -> f (FormResult a) #

mapM :: Monad m => (a -> m b) -> FormResult a -> m (FormResult b) #

sequence :: Monad m => FormResult (m a) -> m (FormResult a) #

Traversable Maybe

Since: base-2.1

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Maybe a -> f (Maybe b) #

sequenceA :: Applicative f => Maybe (f a) -> f (Maybe a) #

mapM :: Monad m => (a -> m b) -> Maybe a -> m (Maybe b) #

sequence :: Monad m => Maybe (m a) -> m (Maybe a) #

Traversable Solo

Since: base-4.15

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Solo a -> f (Solo b) #

sequenceA :: Applicative f => Solo (f a) -> f (Solo a) #

mapM :: Monad m => (a -> m b) -> Solo a -> m (Solo b) #

sequence :: Monad m => Solo (m a) -> m (Solo a) #

Traversable []

Since: base-2.1

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> [a] -> f [b] #

sequenceA :: Applicative f => [f a] -> f [a] #

mapM :: Monad m => (a -> m b) -> [a] -> m [b] #

sequence :: Monad m => [m a] -> m [a] #

Traversable (Either a)

Since: base-4.7.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a0 -> f b) -> Either a a0 -> f (Either a b) #

sequenceA :: Applicative f => Either a (f a0) -> f (Either a a0) #

mapM :: Monad m => (a0 -> m b) -> Either a a0 -> m (Either a b) #

sequence :: Monad m => Either a (m a0) -> m (Either a a0) #

Traversable (Proxy :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Proxy a -> f (Proxy b) #

sequenceA :: Applicative f => Proxy (f a) -> f (Proxy a) #

mapM :: Monad m => (a -> m b) -> Proxy a -> m (Proxy b) #

sequence :: Monad m => Proxy (m a) -> m (Proxy a) #

Traversable (Arg a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

traverse :: Applicative f => (a0 -> f b) -> Arg a a0 -> f (Arg a b) #

sequenceA :: Applicative f => Arg a (f a0) -> f (Arg a a0) #

mapM :: Monad m => (a0 -> m b) -> Arg a a0 -> m (Arg a b) #

sequence :: Monad m => Arg a (m a0) -> m (Arg a a0) #

Ix i => Traversable (Array i)

Since: base-2.1

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Array i a -> f (Array i b) #

sequenceA :: Applicative f => Array i (f a) -> f (Array i a) #

mapM :: Monad m => (a -> m b) -> Array i a -> m (Array i b) #

sequence :: Monad m => Array i (m a) -> m (Array i a) #

Traversable (U1 :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> U1 a -> f (U1 b) #

sequenceA :: Applicative f => U1 (f a) -> f (U1 a) #

mapM :: Monad m => (a -> m b) -> U1 a -> m (U1 b) #

sequence :: Monad m => U1 (m a) -> m (U1 a) #

Traversable (UAddr :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> UAddr a -> f (UAddr b) #

sequenceA :: Applicative f => UAddr (f a) -> f (UAddr a) #

mapM :: Monad m => (a -> m b) -> UAddr a -> m (UAddr b) #

sequence :: Monad m => UAddr (m a) -> m (UAddr a) #

Traversable (UChar :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> UChar a -> f (UChar b) #

sequenceA :: Applicative f => UChar (f a) -> f (UChar a) #

mapM :: Monad m => (a -> m b) -> UChar a -> m (UChar b) #

sequence :: Monad m => UChar (m a) -> m (UChar a) #

Traversable (UDouble :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> UDouble a -> f (UDouble b) #

sequenceA :: Applicative f => UDouble (f a) -> f (UDouble a) #

mapM :: Monad m => (a -> m b) -> UDouble a -> m (UDouble b) #

sequence :: Monad m => UDouble (m a) -> m (UDouble a) #

Traversable (UFloat :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> UFloat a -> f (UFloat b) #

sequenceA :: Applicative f => UFloat (f a) -> f (UFloat a) #

mapM :: Monad m => (a -> m b) -> UFloat a -> m (UFloat b) #

sequence :: Monad m => UFloat (m a) -> m (UFloat a) #

Traversable (UInt :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> UInt a -> f (UInt b) #

sequenceA :: Applicative f => UInt (f a) -> f (UInt a) #

mapM :: Monad m => (a -> m b) -> UInt a -> m (UInt b) #

sequence :: Monad m => UInt (m a) -> m (UInt a) #

Traversable (UWord :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> UWord a -> f (UWord b) #

sequenceA :: Applicative f => UWord (f a) -> f (UWord a) #

mapM :: Monad m => (a -> m b) -> UWord a -> m (UWord b) #

sequence :: Monad m => UWord (m a) -> m (UWord a) #

Traversable (V1 :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> V1 a -> f (V1 b) #

sequenceA :: Applicative f => V1 (f a) -> f (V1 a) #

mapM :: Monad m => (a -> m b) -> V1 a -> m (V1 b) #

sequence :: Monad m => V1 (m a) -> m (V1 a) #

Traversable (Map k)

Traverses in order of increasing key.

Instance details

Defined in Data.Map.Internal

Methods

traverse :: Applicative f => (a -> f b) -> Map k a -> f (Map k b) #

sequenceA :: Applicative f => Map k (f a) -> f (Map k a) #

mapM :: Monad m => (a -> m b) -> Map k a -> m (Map k b) #

sequence :: Monad m => Map k (m a) -> m (Map k a) #

(Monad m, Traversable m) => Traversable (CatchT m) 
Instance details

Defined in Control.Monad.Catch.Pure

Methods

traverse :: Applicative f => (a -> f b) -> CatchT m a -> f (CatchT m b) #

sequenceA :: Applicative f => CatchT m (f a) -> f (CatchT m a) #

mapM :: Monad m0 => (a -> m0 b) -> CatchT m a -> m0 (CatchT m b) #

sequence :: Monad m0 => CatchT m (m0 a) -> m0 (CatchT m a) #

Traversable f => Traversable (Cofree f) 
Instance details

Defined in Control.Comonad.Cofree

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Cofree f a -> f0 (Cofree f b) #

sequenceA :: Applicative f0 => Cofree f (f0 a) -> f0 (Cofree f a) #

mapM :: Monad m => (a -> m b) -> Cofree f a -> m (Cofree f b) #

sequence :: Monad m => Cofree f (m a) -> m (Cofree f a) #

Traversable f => Traversable (Free f) 
Instance details

Defined in Control.Monad.Free

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Free f a -> f0 (Free f b) #

sequenceA :: Applicative f0 => Free f (f0 a) -> f0 (Free f a) #

mapM :: Monad m => (a -> m b) -> Free f a -> m (Free f b) #

sequence :: Monad m => Free f (m a) -> m (Free f a) #

Traversable (Either e) 
Instance details

Defined in Data.Strict.Either

Methods

traverse :: Applicative f => (a -> f b) -> Either e a -> f (Either e b) #

sequenceA :: Applicative f => Either e (f a) -> f (Either e a) #

mapM :: Monad m => (a -> m b) -> Either e a -> m (Either e b) #

sequence :: Monad m => Either e (m a) -> m (Either e a) #

Traversable (These a) 
Instance details

Defined in Data.Strict.These

Methods

traverse :: Applicative f => (a0 -> f b) -> These a a0 -> f (These a b) #

sequenceA :: Applicative f => These a (f a0) -> f (These a a0) #

mapM :: Monad m => (a0 -> m b) -> These a a0 -> m (These a b) #

sequence :: Monad m => These a (m a0) -> m (These a a0) #

Traversable (Pair e) 
Instance details

Defined in Data.Strict.Tuple

Methods

traverse :: Applicative f => (a -> f b) -> Pair e a -> f (Pair e b) #

sequenceA :: Applicative f => Pair e (f a) -> f (Pair e a) #

mapM :: Monad m => (a -> m b) -> Pair e a -> m (Pair e b) #

sequence :: Monad m => Pair e (m a) -> m (Pair e a) #

Traversable (These a) 
Instance details

Defined in Data.These

Methods

traverse :: Applicative f => (a0 -> f b) -> These a a0 -> f (These a b) #

sequenceA :: Applicative f => These a (f a0) -> f (These a a0) #

mapM :: Monad m => (a0 -> m b) -> These a a0 -> m (These a b) #

sequence :: Monad m => These a (m a0) -> m (These a a0) #

Traversable f => Traversable (Lift f) 
Instance details

Defined in Control.Applicative.Lift

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Lift f a -> f0 (Lift f b) #

sequenceA :: Applicative f0 => Lift f (f0 a) -> f0 (Lift f a) #

mapM :: Monad m => (a -> m b) -> Lift f a -> m (Lift f b) #

sequence :: Monad m => Lift f (m a) -> m (Lift f a) #

Traversable f => Traversable (ListT f) 
Instance details

Defined in Control.Monad.Trans.List

Methods

traverse :: Applicative f0 => (a -> f0 b) -> ListT f a -> f0 (ListT f b) #

sequenceA :: Applicative f0 => ListT f (f0 a) -> f0 (ListT f a) #

mapM :: Monad m => (a -> m b) -> ListT f a -> m (ListT f b) #

sequence :: Monad m => ListT f (m a) -> m (ListT f a) #

Traversable f => Traversable (MaybeT f) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

traverse :: Applicative f0 => (a -> f0 b) -> MaybeT f a -> f0 (MaybeT f b) #

sequenceA :: Applicative f0 => MaybeT f (f0 a) -> f0 (MaybeT f a) #

mapM :: Monad m => (a -> m b) -> MaybeT f a -> m (MaybeT f b) #

sequence :: Monad m => MaybeT f (m a) -> m (MaybeT f a) #

Traversable (HashMap k) 
Instance details

Defined in Data.HashMap.Internal

Methods

traverse :: Applicative f => (a -> f b) -> HashMap k a -> f (HashMap k b) #

sequenceA :: Applicative f => HashMap k (f a) -> f (HashMap k a) #

mapM :: Monad m => (a -> m b) -> HashMap k a -> m (HashMap k b) #

sequence :: Monad m => HashMap k (m a) -> m (HashMap k a) #

Traversable ((,) a)

Since: base-4.7.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a0 -> f b) -> (a, a0) -> f (a, b) #

sequenceA :: Applicative f => (a, f a0) -> f (a, a0) #

mapM :: Monad m => (a0 -> m b) -> (a, a0) -> m (a, b) #

sequence :: Monad m => (a, m a0) -> m (a, a0) #

Traversable (Const m :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Const m a -> f (Const m b) #

sequenceA :: Applicative f => Const m (f a) -> f (Const m a) #

mapM :: Monad m0 => (a -> m0 b) -> Const m a -> m0 (Const m b) #

sequence :: Monad m0 => Const m (m0 a) -> m0 (Const m a) #

Traversable f => Traversable (Ap f)

Since: base-4.12.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Ap f a -> f0 (Ap f b) #

sequenceA :: Applicative f0 => Ap f (f0 a) -> f0 (Ap f a) #

mapM :: Monad m => (a -> m b) -> Ap f a -> m (Ap f b) #

sequence :: Monad m => Ap f (m a) -> m (Ap f a) #

Traversable f => Traversable (Alt f)

Since: base-4.12.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Alt f a -> f0 (Alt f b) #

sequenceA :: Applicative f0 => Alt f (f0 a) -> f0 (Alt f a) #

mapM :: Monad m => (a -> m b) -> Alt f a -> m (Alt f b) #

sequence :: Monad m => Alt f (m a) -> m (Alt f a) #

Traversable f => Traversable (Rec1 f)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Rec1 f a -> f0 (Rec1 f b) #

sequenceA :: Applicative f0 => Rec1 f (f0 a) -> f0 (Rec1 f a) #

mapM :: Monad m => (a -> m b) -> Rec1 f a -> m (Rec1 f b) #

sequence :: Monad m => Rec1 f (m a) -> m (Rec1 f a) #

Bitraversable p => Traversable (Join p) 
Instance details

Defined in Data.Bifunctor.Join

Methods

traverse :: Applicative f => (a -> f b) -> Join p a -> f (Join p b) #

sequenceA :: Applicative f => Join p (f a) -> f (Join p a) #

mapM :: Monad m => (a -> m b) -> Join p a -> m (Join p b) #

sequence :: Monad m => Join p (m a) -> m (Join p a) #

Traversable w => Traversable (EnvT e w) 
Instance details

Defined in Control.Comonad.Trans.Env

Methods

traverse :: Applicative f => (a -> f b) -> EnvT e w a -> f (EnvT e w b) #

sequenceA :: Applicative f => EnvT e w (f a) -> f (EnvT e w a) #

mapM :: Monad m => (a -> m b) -> EnvT e w a -> m (EnvT e w b) #

sequence :: Monad m => EnvT e w (m a) -> m (EnvT e w a) #

Traversable f => Traversable (FreeF f a) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

traverse :: Applicative f0 => (a0 -> f0 b) -> FreeF f a a0 -> f0 (FreeF f a b) #

sequenceA :: Applicative f0 => FreeF f a (f0 a0) -> f0 (FreeF f a a0) #

mapM :: Monad m => (a0 -> m b) -> FreeF f a a0 -> m (FreeF f a b) #

sequence :: Monad m => FreeF f a (m a0) -> m (FreeF f a a0) #

(Monad m, Traversable m, Traversable f) => Traversable (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

traverse :: Applicative f0 => (a -> f0 b) -> FreeT f m a -> f0 (FreeT f m b) #

sequenceA :: Applicative f0 => FreeT f m (f0 a) -> f0 (FreeT f m a) #

mapM :: Monad m0 => (a -> m0 b) -> FreeT f m a -> m0 (FreeT f m b) #

sequence :: Monad m0 => FreeT f m (m0 a) -> m0 (FreeT f m a) #

Traversable (Tagged s) 
Instance details

Defined in Data.Tagged

Methods

traverse :: Applicative f => (a -> f b) -> Tagged s a -> f (Tagged s b) #

sequenceA :: Applicative f => Tagged s (f a) -> f (Tagged s a) #

mapM :: Monad m => (a -> m b) -> Tagged s a -> m (Tagged s b) #

sequence :: Monad m => Tagged s (m a) -> m (Tagged s a) #

(Traversable f, Traversable g) => Traversable (These1 f g) 
Instance details

Defined in Data.Functor.These

Methods

traverse :: Applicative f0 => (a -> f0 b) -> These1 f g a -> f0 (These1 f g b) #

sequenceA :: Applicative f0 => These1 f g (f0 a) -> f0 (These1 f g a) #

mapM :: Monad m => (a -> m b) -> These1 f g a -> m (These1 f g b) #

sequence :: Monad m => These1 f g (m a) -> m (These1 f g a) #

Traversable f => Traversable (Backwards f)

Derived instance.

Instance details

Defined in Control.Applicative.Backwards

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Backwards f a -> f0 (Backwards f b) #

sequenceA :: Applicative f0 => Backwards f (f0 a) -> f0 (Backwards f a) #

mapM :: Monad m => (a -> m b) -> Backwards f a -> m (Backwards f b) #

sequence :: Monad m => Backwards f (m a) -> m (Backwards f a) #

Traversable f => Traversable (ErrorT e f) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

traverse :: Applicative f0 => (a -> f0 b) -> ErrorT e f a -> f0 (ErrorT e f b) #

sequenceA :: Applicative f0 => ErrorT e f (f0 a) -> f0 (ErrorT e f a) #

mapM :: Monad m => (a -> m b) -> ErrorT e f a -> m (ErrorT e f b) #

sequence :: Monad m => ErrorT e f (m a) -> m (ErrorT e f a) #

Traversable f => Traversable (ExceptT e f) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

traverse :: Applicative f0 => (a -> f0 b) -> ExceptT e f a -> f0 (ExceptT e f b) #

sequenceA :: Applicative f0 => ExceptT e f (f0 a) -> f0 (ExceptT e f a) #

mapM :: Monad m => (a -> m b) -> ExceptT e f a -> m (ExceptT e f b) #

sequence :: Monad m => ExceptT e f (m a) -> m (ExceptT e f a) #

Traversable f => Traversable (IdentityT f) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

traverse :: Applicative f0 => (a -> f0 b) -> IdentityT f a -> f0 (IdentityT f b) #

sequenceA :: Applicative f0 => IdentityT f (f0 a) -> f0 (IdentityT f a) #

mapM :: Monad m => (a -> m b) -> IdentityT f a -> m (IdentityT f b) #

sequence :: Monad m => IdentityT f (m a) -> m (IdentityT f a) #

Traversable f => Traversable (WriterT w f) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

traverse :: Applicative f0 => (a -> f0 b) -> WriterT w f a -> f0 (WriterT w f b) #

sequenceA :: Applicative f0 => WriterT w f (f0 a) -> f0 (WriterT w f a) #

mapM :: Monad m => (a -> m b) -> WriterT w f a -> m (WriterT w f b) #

sequence :: Monad m => WriterT w f (m a) -> m (WriterT w f a) #

Traversable f => Traversable (WriterT w f) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

traverse :: Applicative f0 => (a -> f0 b) -> WriterT w f a -> f0 (WriterT w f b) #

sequenceA :: Applicative f0 => WriterT w f (f0 a) -> f0 (WriterT w f a) #

mapM :: Monad m => (a -> m b) -> WriterT w f a -> m (WriterT w f b) #

sequence :: Monad m => WriterT w f (m a) -> m (WriterT w f a) #

Traversable (Constant a :: Type -> Type) 
Instance details

Defined in Data.Functor.Constant

Methods

traverse :: Applicative f => (a0 -> f b) -> Constant a a0 -> f (Constant a b) #

sequenceA :: Applicative f => Constant a (f a0) -> f (Constant a a0) #

mapM :: Monad m => (a0 -> m b) -> Constant a a0 -> m (Constant a b) #

sequence :: Monad m => Constant a (m a0) -> m (Constant a a0) #

Traversable f => Traversable (Reverse f)

Traverse from right to left.

Instance details

Defined in Data.Functor.Reverse

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Reverse f a -> f0 (Reverse f b) #

sequenceA :: Applicative f0 => Reverse f (f0 a) -> f0 (Reverse f a) #

mapM :: Monad m => (a -> m b) -> Reverse f a -> m (Reverse f b) #

sequence :: Monad m => Reverse f (m a) -> m (Reverse f a) #

(Traversable f, Traversable g) => Traversable (Product f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Product

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Product f g a -> f0 (Product f g b) #

sequenceA :: Applicative f0 => Product f g (f0 a) -> f0 (Product f g a) #

mapM :: Monad m => (a -> m b) -> Product f g a -> m (Product f g b) #

sequence :: Monad m => Product f g (m a) -> m (Product f g a) #

(Traversable f, Traversable g) => Traversable (Sum f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Sum

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Sum f g a -> f0 (Sum f g b) #

sequenceA :: Applicative f0 => Sum f g (f0 a) -> f0 (Sum f g a) #

mapM :: Monad m => (a -> m b) -> Sum f g a -> m (Sum f g b) #

sequence :: Monad m => Sum f g (m a) -> m (Sum f g a) #

(Traversable f, Traversable g) => Traversable (f :*: g)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f0 => (a -> f0 b) -> (f :*: g) a -> f0 ((f :*: g) b) #

sequenceA :: Applicative f0 => (f :*: g) (f0 a) -> f0 ((f :*: g) a) #

mapM :: Monad m => (a -> m b) -> (f :*: g) a -> m ((f :*: g) b) #

sequence :: Monad m => (f :*: g) (m a) -> m ((f :*: g) a) #

(Traversable f, Traversable g) => Traversable (f :+: g)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f0 => (a -> f0 b) -> (f :+: g) a -> f0 ((f :+: g) b) #

sequenceA :: Applicative f0 => (f :+: g) (f0 a) -> f0 ((f :+: g) a) #

mapM :: Monad m => (a -> m b) -> (f :+: g) a -> m ((f :+: g) b) #

sequence :: Monad m => (f :+: g) (m a) -> m ((f :+: g) a) #

Traversable (K1 i c :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> K1 i c a -> f (K1 i c b) #

sequenceA :: Applicative f => K1 i c (f a) -> f (K1 i c a) #

mapM :: Monad m => (a -> m b) -> K1 i c a -> m (K1 i c b) #

sequence :: Monad m => K1 i c (m a) -> m (K1 i c a) #

(Traversable f, Traversable g) => Traversable (Compose f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Compose f g a -> f0 (Compose f g b) #

sequenceA :: Applicative f0 => Compose f g (f0 a) -> f0 (Compose f g a) #

mapM :: Monad m => (a -> m b) -> Compose f g a -> m (Compose f g b) #

sequence :: Monad m => Compose f g (m a) -> m (Compose f g a) #

(Traversable f, Traversable g) => Traversable (f :.: g)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f0 => (a -> f0 b) -> (f :.: g) a -> f0 ((f :.: g) b) #

sequenceA :: Applicative f0 => (f :.: g) (f0 a) -> f0 ((f :.: g) a) #

mapM :: Monad m => (a -> m b) -> (f :.: g) a -> m ((f :.: g) b) #

sequence :: Monad m => (f :.: g) (m a) -> m ((f :.: g) a) #

Traversable f => Traversable (M1 i c f)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f0 => (a -> f0 b) -> M1 i c f a -> f0 (M1 i c f b) #

sequenceA :: Applicative f0 => M1 i c f (f0 a) -> f0 (M1 i c f a) #

mapM :: Monad m => (a -> m b) -> M1 i c f a -> m (M1 i c f b) #

sequence :: Monad m => M1 i c f (m a) -> m (M1 i c f a) #

Traversable (Clown f a :: Type -> Type) 
Instance details

Defined in Data.Bifunctor.Clown

Methods

traverse :: Applicative f0 => (a0 -> f0 b) -> Clown f a a0 -> f0 (Clown f a b) #

sequenceA :: Applicative f0 => Clown f a (f0 a0) -> f0 (Clown f a a0) #

mapM :: Monad m => (a0 -> m b) -> Clown f a a0 -> m (Clown f a b) #

sequence :: Monad m => Clown f a (m a0) -> m (Clown f a a0) #

Bitraversable p => Traversable (Flip p a) 
Instance details

Defined in Data.Bifunctor.Flip

Methods

traverse :: Applicative f => (a0 -> f b) -> Flip p a a0 -> f (Flip p a b) #

sequenceA :: Applicative f => Flip p a (f a0) -> f (Flip p a a0) #

mapM :: Monad m => (a0 -> m b) -> Flip p a a0 -> m (Flip p a b) #

sequence :: Monad m => Flip p a (m a0) -> m (Flip p a a0) #

Traversable g => Traversable (Joker g a) 
Instance details

Defined in Data.Bifunctor.Joker

Methods

traverse :: Applicative f => (a0 -> f b) -> Joker g a a0 -> f (Joker g a b) #

sequenceA :: Applicative f => Joker g a (f a0) -> f (Joker g a a0) #

mapM :: Monad m => (a0 -> m b) -> Joker g a a0 -> m (Joker g a b) #

sequence :: Monad m => Joker g a (m a0) -> m (Joker g a a0) #

Bitraversable p => Traversable (WrappedBifunctor p a) 
Instance details

Defined in Data.Bifunctor.Wrapped

Methods

traverse :: Applicative f => (a0 -> f b) -> WrappedBifunctor p a a0 -> f (WrappedBifunctor p a b) #

sequenceA :: Applicative f => WrappedBifunctor p a (f a0) -> f (WrappedBifunctor p a a0) #

mapM :: Monad m => (a0 -> m b) -> WrappedBifunctor p a a0 -> m (WrappedBifunctor p a b) #

sequence :: Monad m => WrappedBifunctor p a (m a0) -> m (WrappedBifunctor p a a0) #

(Traversable f, Bitraversable p) => Traversable (Tannen f p a) 
Instance details

Defined in Data.Bifunctor.Tannen

Methods

traverse :: Applicative f0 => (a0 -> f0 b) -> Tannen f p a a0 -> f0 (Tannen f p a b) #

sequenceA :: Applicative f0 => Tannen f p a (f0 a0) -> f0 (Tannen f p a a0) #

mapM :: Monad m => (a0 -> m b) -> Tannen f p a a0 -> m (Tannen f p a b) #

sequence :: Monad m => Tannen f p a (m a0) -> m (Tannen f p a a0) #

(Bitraversable p, Traversable g) => Traversable (Biff p f g a) 
Instance details

Defined in Data.Bifunctor.Biff

Methods

traverse :: Applicative f0 => (a0 -> f0 b) -> Biff p f g a a0 -> f0 (Biff p f g a b) #

sequenceA :: Applicative f0 => Biff p f g a (f0 a0) -> f0 (Biff p f g a a0) #

mapM :: Monad m => (a0 -> m b) -> Biff p f g a a0 -> m (Biff p f g a b) #

sequence :: Monad m => Biff p f g a (m a0) -> m (Biff p f g a a0) #

class Generic a #

Representable types of kind *. This class is derivable in GHC with the DeriveGeneric flag on.

A Generic instance must satisfy the following laws:

from . toid
to . fromid

Minimal complete definition

from, to

Instances

Instances details
Generic Value 
Instance details

Defined in Data.Aeson.Types.Internal

Associated Types

type Rep Value :: Type -> Type #

Methods

from :: Value -> Rep Value x #

to :: Rep Value x -> Value #

Generic All 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep All :: Type -> Type #

Methods

from :: All -> Rep All x #

to :: Rep All x -> All #

Generic Any 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep Any :: Type -> Type #

Methods

from :: Any -> Rep Any x #

to :: Rep Any x -> Any #

Generic Version 
Instance details

Defined in Data.Version

Associated Types

type Rep Version :: Type -> Type #

Methods

from :: Version -> Rep Version x #

to :: Rep Version x -> Version #

Generic Void 
Instance details

Defined in Data.Void

Associated Types

type Rep Void :: Type -> Type #

Methods

from :: Void -> Rep Void x #

to :: Rep Void x -> Void #

Generic Fingerprint 
Instance details

Defined in GHC.Generics

Associated Types

type Rep Fingerprint :: Type -> Type #

Generic Associativity 
Instance details

Defined in GHC.Generics

Associated Types

type Rep Associativity :: Type -> Type #

Generic DecidedStrictness 
Instance details

Defined in GHC.Generics

Associated Types

type Rep DecidedStrictness :: Type -> Type #

Generic Fixity 
Instance details

Defined in GHC.Generics

Associated Types

type Rep Fixity :: Type -> Type #

Methods

from :: Fixity -> Rep Fixity x #

to :: Rep Fixity x -> Fixity #

Generic SourceStrictness 
Instance details

Defined in GHC.Generics

Associated Types

type Rep SourceStrictness :: Type -> Type #

Generic SourceUnpackedness 
Instance details

Defined in GHC.Generics

Associated Types

type Rep SourceUnpackedness :: Type -> Type #

Generic ExitCode 
Instance details

Defined in GHC.IO.Exception

Associated Types

type Rep ExitCode :: Type -> Type #

Methods

from :: ExitCode -> Rep ExitCode x #

to :: Rep ExitCode x -> ExitCode #

Generic CCFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep CCFlags :: Type -> Type #

Methods

from :: CCFlags -> Rep CCFlags x #

to :: Rep CCFlags x -> CCFlags #

Generic ConcFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep ConcFlags :: Type -> Type #

Generic DebugFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep DebugFlags :: Type -> Type #

Generic DoCostCentres 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep DoCostCentres :: Type -> Type #

Generic DoHeapProfile 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep DoHeapProfile :: Type -> Type #

Generic DoTrace 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep DoTrace :: Type -> Type #

Methods

from :: DoTrace -> Rep DoTrace x #

to :: Rep DoTrace x -> DoTrace #

Generic GCFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep GCFlags :: Type -> Type #

Methods

from :: GCFlags -> Rep GCFlags x #

to :: Rep GCFlags x -> GCFlags #

Generic GiveGCStats 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep GiveGCStats :: Type -> Type #

Generic MiscFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep MiscFlags :: Type -> Type #

Generic ParFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep ParFlags :: Type -> Type #

Methods

from :: ParFlags -> Rep ParFlags x #

to :: Rep ParFlags x -> ParFlags #

Generic ProfFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep ProfFlags :: Type -> Type #

Generic RTSFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep RTSFlags :: Type -> Type #

Methods

from :: RTSFlags -> Rep RTSFlags x #

to :: Rep RTSFlags x -> RTSFlags #

Generic TickyFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep TickyFlags :: Type -> Type #

Generic TraceFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep TraceFlags :: Type -> Type #

Generic SrcLoc 
Instance details

Defined in GHC.Generics

Associated Types

type Rep SrcLoc :: Type -> Type #

Methods

from :: SrcLoc -> Rep SrcLoc x #

to :: Rep SrcLoc x -> SrcLoc #

Generic GCDetails 
Instance details

Defined in GHC.Stats

Associated Types

type Rep GCDetails :: Type -> Type #

Generic RTSStats 
Instance details

Defined in GHC.Stats

Associated Types

type Rep RTSStats :: Type -> Type #

Methods

from :: RTSStats -> Rep RTSStats x #

to :: Rep RTSStats x -> RTSStats #

Generic GeneralCategory 
Instance details

Defined in GHC.Generics

Associated Types

type Rep GeneralCategory :: Type -> Type #

Generic BitcoindEnv Source # 
Instance details

Defined in BtcLsp.Data.Env

Associated Types

type Rep BitcoindEnv :: Type -> Type #

Generic BitcoinLayer Source # 
Instance details

Defined in BtcLsp.Data.Kind

Associated Types

type Rep BitcoinLayer :: Type -> Type #

Generic Direction Source # 
Instance details

Defined in BtcLsp.Data.Kind

Associated Types

type Rep Direction :: Type -> Type #

Generic MoneyRelation Source # 
Instance details

Defined in BtcLsp.Data.Kind

Associated Types

type Rep MoneyRelation :: Type -> Type #

Generic Owner Source # 
Instance details

Defined in BtcLsp.Data.Kind

Associated Types

type Rep Owner :: Type -> Type #

Methods

from :: Owner -> Rep Owner x #

to :: Rep Owner x -> Owner #

Generic Table Source # 
Instance details

Defined in BtcLsp.Data.Kind

Associated Types

type Rep Table :: Type -> Type #

Methods

from :: Table -> Rep Table x #

to :: Rep Table x -> Table #

Generic BlkHash Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep BlkHash :: Type -> Type #

Methods

from :: BlkHash -> Rep BlkHash x #

to :: Rep BlkHash x -> BlkHash #

Generic BlkHeight Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep BlkHeight :: Type -> Type #

Generic BlkStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep BlkStatus :: Type -> Type #

Generic Failure Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep Failure :: Type -> Type #

Methods

from :: Failure -> Rep Failure x #

to :: Rep Failure x -> Failure #

Generic FailureInput Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep FailureInput :: Type -> Type #

Generic FailureInternal Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep FailureInternal :: Type -> Type #

Generic FeeRate Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep FeeRate :: Type -> Type #

Methods

from :: FeeRate -> Rep FeeRate x #

to :: Rep FeeRate x -> FeeRate #

Generic LnChanStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep LnChanStatus :: Type -> Type #

Generic LnInvoiceStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep LnInvoiceStatus :: Type -> Type #

Generic MicroSeconds Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep MicroSeconds :: Type -> Type #

Generic NodePubKeyHex Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep NodePubKeyHex :: Type -> Type #

Generic NodeUri Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep NodeUri :: Type -> Type #

Methods

from :: NodeUri -> Rep NodeUri x #

to :: Rep NodeUri x -> NodeUri #

Generic NodeUriHex Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep NodeUriHex :: Type -> Type #

Generic Nonce Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep Nonce :: Type -> Type #

Methods

from :: Nonce -> Rep Nonce x #

to :: Rep Nonce x -> Nonce #

Generic Privacy Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep Privacy :: Type -> Type #

Methods

from :: Privacy -> Rep Privacy x #

to :: Rep Privacy x -> Privacy #

Generic PsbtUtxo Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep PsbtUtxo :: Type -> Type #

Methods

from :: PsbtUtxo -> Rep PsbtUtxo x #

to :: Rep PsbtUtxo x -> PsbtUtxo #

Generic RHashHex Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep RHashHex :: Type -> Type #

Methods

from :: RHashHex -> Rep RHashHex x #

to :: Rep RHashHex x -> RHashHex #

Generic RowQty Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep RowQty :: Type -> Type #

Methods

from :: RowQty -> Rep RowQty x #

to :: Rep RowQty x -> RowQty #

Generic Seconds Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep Seconds :: Type -> Type #

Methods

from :: Seconds -> Rep Seconds x #

to :: Rep Seconds x -> Seconds #

Generic SocketAddress Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep SocketAddress :: Type -> Type #

Generic SwapHash Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep SwapHash :: Type -> Type #

Methods

from :: SwapHash -> Rep SwapHash x #

to :: Rep SwapHash x -> SwapHash #

Generic SwapStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep SwapStatus :: Type -> Type #

Generic SwapUtxoStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep SwapUtxoStatus :: Type -> Type #

Generic UtxoLockId Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep UtxoLockId :: Type -> Type #

Generic Vbyte Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep Vbyte :: Type -> Type #

Methods

from :: Vbyte -> Rep Vbyte x #

to :: Rep Vbyte x -> Vbyte #

Generic YesodLog Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep YesodLog :: Type -> Type #

Methods

from :: YesodLog -> Rep YesodLog x #

to :: Rep YesodLog x -> YesodLog #

Generic GCEnv Source # 
Instance details

Defined in BtcLsp.Grpc.Client.LowLevel

Associated Types

type Rep GCEnv :: Type -> Type #

Methods

from :: GCEnv -> Rep GCEnv x #

to :: Rep GCEnv x -> GCEnv #

Generic Encryption Source # 
Instance details

Defined in BtcLsp.Grpc.Data

Associated Types

type Rep Encryption :: Type -> Type #

Generic RawRequestBytes Source # 
Instance details

Defined in BtcLsp.Grpc.Data

Associated Types

type Rep RawRequestBytes :: Type -> Type #

Generic GSEnv Source # 
Instance details

Defined in BtcLsp.Grpc.Server.LowLevel

Associated Types

type Rep GSEnv :: Type -> Type #

Methods

from :: GSEnv -> Rep GSEnv x #

to :: Rep GSEnv x -> GSEnv #

Generic LndSig Source # 
Instance details

Defined in BtcLsp.Grpc.Sig

Associated Types

type Rep LndSig :: Type -> Type #

Methods

from :: LndSig -> Rep LndSig x #

to :: Rep LndSig x -> LndSig #

Generic MsgToSign Source # 
Instance details

Defined in BtcLsp.Grpc.Sig

Associated Types

type Rep MsgToSign :: Type -> Type #

Generic InQty Source # 
Instance details

Defined in BtcLsp.Math.OnChain

Associated Types

type Rep InQty :: Type -> Type #

Methods

from :: InQty -> Rep InQty x #

to :: Rep InQty x -> InQty #

Generic OutQty Source # 
Instance details

Defined in BtcLsp.Math.OnChain

Associated Types

type Rep OutQty :: Type -> Type #

Methods

from :: OutQty -> Rep OutQty x #

to :: Rep OutQty x -> OutQty #

Generic SatPerVbyte Source # 
Instance details

Defined in BtcLsp.Math.OnChain

Associated Types

type Rep SatPerVbyte :: Type -> Type #

Generic SwapCap Source # 
Instance details

Defined in BtcLsp.Math.Swap

Associated Types

type Rep SwapCap :: Type -> Type #

Methods

from :: SwapCap -> Rep SwapCap x #

to :: Rep SwapCap x -> SwapCap #

Generic OpenUpdateEvt Source # 
Instance details

Defined in BtcLsp.Psbt.PsbtOpener

Associated Types

type Rep OpenUpdateEvt :: Type -> Type #

Generic Block Source # 
Instance details

Defined in BtcLsp.Storage.Model

Associated Types

type Rep Block :: Type -> Type #

Methods

from :: Block -> Rep Block x #

to :: Rep Block x -> Block #

Generic LnChan Source # 
Instance details

Defined in BtcLsp.Storage.Model

Associated Types

type Rep LnChan :: Type -> Type #

Methods

from :: LnChan -> Rep LnChan x #

to :: Rep LnChan x -> LnChan #

Generic SwapIntoLn Source # 
Instance details

Defined in BtcLsp.Storage.Model

Associated Types

type Rep SwapIntoLn :: Type -> Type #

Generic SwapUtxo Source # 
Instance details

Defined in BtcLsp.Storage.Model

Associated Types

type Rep SwapUtxo :: Type -> Type #

Methods

from :: SwapUtxo -> Rep SwapUtxo x #

to :: Rep SwapUtxo x -> SwapUtxo #

Generic User Source # 
Instance details

Defined in BtcLsp.Storage.Model

Associated Types

type Rep User :: Type -> Type #

Methods

from :: User -> Rep User x #

to :: Rep User x -> User #

Generic HtmlClassAttr Source # 
Instance details

Defined in BtcLsp.Yesod.Data.Widget

Associated Types

type Rep HtmlClassAttr :: Type -> Type #

Generic Layout Source # 
Instance details

Defined in BtcLsp.Yesod.Data.Widget

Associated Types

type Rep Layout :: Type -> Type #

Methods

from :: Layout -> Rep Layout x #

to :: Rep Layout x -> Layout #

Generic Ctx Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Associated Types

type Rep Ctx :: Type -> Type #

Methods

from :: Ctx -> Rep Ctx x #

to :: Rep Ctx x -> Ctx #

Generic FeeMoney Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Associated Types

type Rep FeeMoney :: Type -> Type #

Methods

from :: FeeMoney -> Rep FeeMoney x #

to :: Rep FeeMoney x -> FeeMoney #

Generic FeeRate Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Associated Types

type Rep FeeRate :: Type -> Type #

Methods

from :: FeeRate -> Rep FeeRate x #

to :: Rep FeeRate x -> FeeRate #

Generic FieldIndex Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Associated Types

type Rep FieldIndex :: Type -> Type #

Generic FundLnHodlInvoice Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Associated Types

type Rep FundLnHodlInvoice :: Type -> Type #

Generic FundLnInvoice Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Associated Types

type Rep FundLnInvoice :: Type -> Type #

Generic FundMoney Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Associated Types

type Rep FundMoney :: Type -> Type #

Generic FundOnChainAddress Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Associated Types

type Rep FundOnChainAddress :: Type -> Type #

Generic InputFailure Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Associated Types

type Rep InputFailure :: Type -> Type #

Generic InputFailureKind Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Associated Types

type Rep InputFailureKind :: Type -> Type #

Generic InputFailureKind'UnrecognizedValue Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Associated Types

type Rep InputFailureKind'UnrecognizedValue :: Type -> Type #

Generic InternalFailure Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Associated Types

type Rep InternalFailure :: Type -> Type #

Generic InternalFailure'Either Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Associated Types

type Rep InternalFailure'Either :: Type -> Type #

Generic LnHost Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Associated Types

type Rep LnHost :: Type -> Type #

Methods

from :: LnHost -> Rep LnHost x #

to :: Rep LnHost x -> LnHost #

Generic LnPeer Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Associated Types

type Rep LnPeer :: Type -> Type #

Methods

from :: LnPeer -> Rep LnPeer x #

to :: Rep LnPeer x -> LnPeer #

Generic LnPort Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Associated Types

type Rep LnPort :: Type -> Type #

Methods

from :: LnPort -> Rep LnPort x #

to :: Rep LnPort x -> LnPort #

Generic LnPubKey Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Associated Types

type Rep LnPubKey :: Type -> Type #

Methods

from :: LnPubKey -> Rep LnPubKey x #

to :: Rep LnPubKey x -> LnPubKey #

Generic LocalBalance Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Associated Types

type Rep LocalBalance :: Type -> Type #

Generic Nonce Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Associated Types

type Rep Nonce :: Type -> Type #

Methods

from :: Nonce -> Rep Nonce x #

to :: Rep Nonce x -> Nonce #

Generic Privacy Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Associated Types

type Rep Privacy :: Type -> Type #

Methods

from :: Privacy -> Rep Privacy x #

to :: Rep Privacy x -> Privacy #

Generic Privacy'UnrecognizedValue Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Associated Types

type Rep Privacy'UnrecognizedValue :: Type -> Type #

Generic RefundMoney Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Associated Types

type Rep RefundMoney :: Type -> Type #

Generic RefundOnChainAddress Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Associated Types

type Rep RefundOnChainAddress :: Type -> Type #

Generic RemoteBalance Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Associated Types

type Rep RemoteBalance :: Type -> Type #

Generic LnHodlInvoice Source # 
Instance details

Defined in Proto.BtcLsp.Data.LowLevel

Associated Types

type Rep LnHodlInvoice :: Type -> Type #

Generic LnInvoice Source # 
Instance details

Defined in Proto.BtcLsp.Data.LowLevel

Associated Types

type Rep LnInvoice :: Type -> Type #

Generic Msat Source # 
Instance details

Defined in Proto.BtcLsp.Data.LowLevel

Associated Types

type Rep Msat :: Type -> Type #

Methods

from :: Msat -> Rep Msat x #

to :: Rep Msat x -> Msat #

Generic OnChainAddress Source # 
Instance details

Defined in Proto.BtcLsp.Data.LowLevel

Associated Types

type Rep OnChainAddress :: Type -> Type #

Generic Urational Source # 
Instance details

Defined in Proto.BtcLsp.Data.LowLevel

Associated Types

type Rep Urational :: Type -> Type #

Generic Request Source # 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Associated Types

type Rep Request :: Type -> Type #

Methods

from :: Request -> Rep Request x #

to :: Rep Request x -> Request #

Generic Response Source # 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Associated Types

type Rep Response :: Type -> Type #

Methods

from :: Response -> Rep Response x #

to :: Rep Response x -> Response #

Generic Response'Either Source # 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Associated Types

type Rep Response'Either :: Type -> Type #

Generic Response'Failure Source # 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Associated Types

type Rep Response'Failure :: Type -> Type #

Generic Response'Failure'InputFailure Source # 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Associated Types

type Rep Response'Failure'InputFailure :: Type -> Type #

Generic Response'Failure'InputFailure'UnrecognizedValue Source # 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Generic Response'Success Source # 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Associated Types

type Rep Response'Success :: Type -> Type #

Generic Request Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Associated Types

type Rep Request :: Type -> Type #

Methods

from :: Request -> Rep Request x #

to :: Rep Request x -> Request #

Generic Response Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Associated Types

type Rep Response :: Type -> Type #

Methods

from :: Response -> Rep Response x #

to :: Rep Response x -> Response #

Generic Response'Either Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Associated Types

type Rep Response'Either :: Type -> Type #

Generic Response'Failure Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Associated Types

type Rep Response'Failure :: Type -> Type #

Generic Response'Failure'InputFailure Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Associated Types

type Rep Response'Failure'InputFailure :: Type -> Type #

Generic Response'Failure'InputFailure'UnrecognizedValue Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Generic Response'Success Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Associated Types

type Rep Response'Success :: Type -> Type #

Generic Request Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Associated Types

type Rep Request :: Type -> Type #

Methods

from :: Request -> Rep Request x #

to :: Rep Request x -> Request #

Generic Response Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Associated Types

type Rep Response :: Type -> Type #

Methods

from :: Response -> Rep Response x #

to :: Rep Response x -> Response #

Generic Response'Either Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Associated Types

type Rep Response'Either :: Type -> Type #

Generic Response'Failure Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Associated Types

type Rep Response'Failure :: Type -> Type #

Generic Response'Failure'InputFailure Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Associated Types

type Rep Response'Failure'InputFailure :: Type -> Type #

Generic Response'Failure'InputFailure'UnrecognizedValue Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Generic Response'Success Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Associated Types

type Rep Response'Success :: Type -> Type #

Generic OffsetFormat 
Instance details

Defined in Chronos

Associated Types

type Rep OffsetFormat :: Type -> Type #

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 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 EmailAddress 
Instance details

Defined in Text.Email.Parser

Associated Types

type Rep EmailAddress :: Type -> Type #

Generic ByteStringDoc 
Instance details

Defined in Text.PrettyPrint.GenericPretty.Instance

Associated Types

type Rep ByteStringDoc :: Type -> Type #

Methods

from :: ByteStringDoc -> Rep ByteStringDoc x #

to :: Rep ByteStringDoc x -> ByteStringDoc #

Generic SecretVision 
Instance details

Defined in Text.PrettyPrint.GenericPretty.Type

Associated Types

type Rep SecretVision :: Type -> Type #

Generic ForeignSrcLang 
Instance details

Defined in GHC.ForeignSrcLang.Type

Associated Types

type Rep ForeignSrcLang :: Type -> Type #

Generic Extension 
Instance details

Defined in GHC.LanguageExtensions.Type

Associated Types

type Rep Extension :: Type -> Type #

Generic Ordering 
Instance details

Defined in GHC.Generics

Associated Types

type Rep Ordering :: Type -> Type #

Methods

from :: Ordering -> Rep Ordering x #

to :: Rep Ordering x -> Ordering #

Generic CompressMode Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

Associated Types

type Rep CompressMode :: Type -> Type #

Generic IP 
Instance details

Defined in Data.IP.Addr

Associated Types

type Rep IP :: Type -> Type #

Methods

from :: IP -> Rep IP x #

to :: Rep IP x -> IP #

Generic IPv4 
Instance details

Defined in Data.IP.Addr

Associated Types

type Rep IPv4 :: Type -> Type #

Methods

from :: IPv4 -> Rep IPv4 x #

to :: Rep IPv4 x -> IPv4 #

Generic IPv6 
Instance details

Defined in Data.IP.Addr

Associated Types

type Rep IPv6 :: Type -> Type #

Methods

from :: IPv6 -> Rep IPv6 x #

to :: Rep IPv6 x -> IPv6 #

Generic IPRange 
Instance details

Defined in Data.IP.Range

Associated Types

type Rep IPRange :: Type -> Type #

Methods

from :: IPRange -> Rep IPRange x #

to :: Rep IPRange x -> IPRange #

Generic Environment 
Instance details

Defined in Katip.Core

Associated Types

type Rep Environment :: Type -> Type #

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 AddHodlInvoiceRequest 
Instance details

Defined in LndClient.Data.AddHodlInvoice

Associated Types

type Rep AddHodlInvoiceRequest :: Type -> Type #

Methods

from :: AddHodlInvoiceRequest -> Rep AddHodlInvoiceRequest x #

to :: Rep AddHodlInvoiceRequest x -> AddHodlInvoiceRequest #

Generic AddInvoiceRequest 
Instance details

Defined in LndClient.Data.AddInvoice

Associated Types

type Rep AddInvoiceRequest :: Type -> Type #

Methods

from :: AddInvoiceRequest -> Rep AddInvoiceRequest x #

to :: Rep AddInvoiceRequest x -> AddInvoiceRequest #

Generic AddInvoiceResponse 
Instance details

Defined in LndClient.Data.AddInvoice

Associated Types

type Rep AddInvoiceResponse :: Type -> Type #

Methods

from :: AddInvoiceResponse -> Rep AddInvoiceResponse x #

to :: Rep AddInvoiceResponse x -> AddInvoiceResponse #

Generic Channel 
Instance details

Defined in LndClient.Data.Channel

Associated Types

type Rep Channel :: Type -> Type #

Methods

from :: Channel -> Rep Channel x #

to :: Rep Channel x -> Channel #

Generic ChannelBackup 
Instance details

Defined in LndClient.Data.ChannelBackup

Associated Types

type Rep ChannelBackup :: Type -> Type #

Methods

from :: ChannelBackup -> Rep ChannelBackup x #

to :: Rep ChannelBackup x -> ChannelBackup #

Generic SingleChanBackupBlob 
Instance details

Defined in LndClient.Data.ChannelBackup

Associated Types

type Rep SingleChanBackupBlob :: Type -> Type #

Methods

from :: SingleChanBackupBlob -> Rep SingleChanBackupBlob x #

to :: Rep SingleChanBackupBlob x -> SingleChanBackupBlob #

Generic ChannelPoint 
Instance details

Defined in LndClient.Data.ChannelPoint

Associated Types

type Rep ChannelPoint :: Type -> Type #

Methods

from :: ChannelPoint -> Rep ChannelPoint x #

to :: Rep ChannelPoint x -> ChannelPoint #

Generic ChannelCloseSummary 
Instance details

Defined in LndClient.Data.CloseChannel

Associated Types

type Rep ChannelCloseSummary :: Type -> Type #

Methods

from :: ChannelCloseSummary -> Rep ChannelCloseSummary x #

to :: Rep ChannelCloseSummary x -> ChannelCloseSummary #

Generic ChannelCloseUpdate 
Instance details

Defined in LndClient.Data.CloseChannel

Associated Types

type Rep ChannelCloseUpdate :: Type -> Type #

Methods

from :: ChannelCloseUpdate -> Rep ChannelCloseUpdate x #

to :: Rep ChannelCloseUpdate x -> ChannelCloseUpdate #

Generic CloseChannelRequest 
Instance details

Defined in LndClient.Data.CloseChannel

Associated Types

type Rep CloseChannelRequest :: Type -> Type #

Methods

from :: CloseChannelRequest -> Rep CloseChannelRequest x #

to :: Rep CloseChannelRequest x -> CloseChannelRequest #

Generic CloseStatusUpdate 
Instance details

Defined in LndClient.Data.CloseChannel

Associated Types

type Rep CloseStatusUpdate :: Type -> Type #

Methods

from :: CloseStatusUpdate -> Rep CloseStatusUpdate x #

to :: Rep CloseStatusUpdate x -> CloseStatusUpdate #

Generic ClosedChannel 
Instance details

Defined in LndClient.Data.ClosedChannel

Associated Types

type Rep ClosedChannel :: Type -> Type #

Methods

from :: ClosedChannel -> Rep ClosedChannel x #

to :: Rep ClosedChannel x -> ClosedChannel #

Generic ClosedChannelsRequest 
Instance details

Defined in LndClient.Data.ClosedChannels

Associated Types

type Rep ClosedChannelsRequest :: Type -> Type #

Methods

from :: ClosedChannelsRequest -> Rep ClosedChannelsRequest x #

to :: Rep ClosedChannelsRequest x -> ClosedChannelsRequest #

Generic FinalizePsbtRequest 
Instance details

Defined in LndClient.Data.FinalizePsbt

Associated Types

type Rep FinalizePsbtRequest :: Type -> Type #

Methods

from :: FinalizePsbtRequest -> Rep FinalizePsbtRequest x #

to :: Rep FinalizePsbtRequest x -> FinalizePsbtRequest #

Generic FinalizePsbtResponse 
Instance details

Defined in LndClient.Data.FinalizePsbt

Associated Types

type Rep FinalizePsbtResponse :: Type -> Type #

Methods

from :: FinalizePsbtResponse -> Rep FinalizePsbtResponse x #

to :: Rep FinalizePsbtResponse x -> FinalizePsbtResponse #

Generic ForceClosedChannel 
Instance details

Defined in LndClient.Data.ForceClosedChannel

Associated Types

type Rep ForceClosedChannel :: Type -> Type #

Methods

from :: ForceClosedChannel -> Rep ForceClosedChannel x #

to :: Rep ForceClosedChannel x -> ForceClosedChannel #

Generic Fee 
Instance details

Defined in LndClient.Data.FundPsbt

Associated Types

type Rep Fee :: Type -> Type #

Methods

from :: Fee -> Rep Fee x #

to :: Rep Fee x -> Fee #

Generic FundPsbtRequest 
Instance details

Defined in LndClient.Data.FundPsbt

Associated Types

type Rep FundPsbtRequest :: Type -> Type #

Methods

from :: FundPsbtRequest -> Rep FundPsbtRequest x #

to :: Rep FundPsbtRequest x -> FundPsbtRequest #

Generic FundPsbtResponse 
Instance details

Defined in LndClient.Data.FundPsbt

Associated Types

type Rep FundPsbtResponse :: Type -> Type #

Methods

from :: FundPsbtResponse -> Rep FundPsbtResponse x #

to :: Rep FundPsbtResponse x -> FundPsbtResponse #

Generic TxTemplate 
Instance details

Defined in LndClient.Data.FundPsbt

Associated Types

type Rep TxTemplate :: Type -> Type #

Methods

from :: TxTemplate -> Rep TxTemplate x #

to :: Rep TxTemplate x -> TxTemplate #

Generic UtxoLease 
Instance details

Defined in LndClient.Data.FundPsbt

Associated Types

type Rep UtxoLease :: Type -> Type #

Methods

from :: UtxoLease -> Rep UtxoLease x #

to :: Rep UtxoLease x -> UtxoLease #

Generic FundingPsbtFinalize 
Instance details

Defined in LndClient.Data.FundingPsbtFinalize

Associated Types

type Rep FundingPsbtFinalize :: Type -> Type #

Methods

from :: FundingPsbtFinalize -> Rep FundingPsbtFinalize x #

to :: Rep FundingPsbtFinalize x -> FundingPsbtFinalize #

Generic FundingPsbtVerify 
Instance details

Defined in LndClient.Data.FundingPsbtVerify

Associated Types

type Rep FundingPsbtVerify :: Type -> Type #

Methods

from :: FundingPsbtVerify -> Rep FundingPsbtVerify x #

to :: Rep FundingPsbtVerify x -> FundingPsbtVerify #

Generic ChanPointShim 
Instance details

Defined in LndClient.Data.FundingShim

Associated Types

type Rep ChanPointShim :: Type -> Type #

Methods

from :: ChanPointShim -> Rep ChanPointShim x #

to :: Rep ChanPointShim x -> ChanPointShim #

Generic FundingShim 
Instance details

Defined in LndClient.Data.FundingShim

Associated Types

type Rep FundingShim :: Type -> Type #

Methods

from :: FundingShim -> Rep FundingShim x #

to :: Rep FundingShim x -> FundingShim #

Generic KeyDescriptor 
Instance details

Defined in LndClient.Data.FundingShim

Associated Types

type Rep KeyDescriptor :: Type -> Type #

Methods

from :: KeyDescriptor -> Rep KeyDescriptor x #

to :: Rep KeyDescriptor x -> KeyDescriptor #

Generic FundingShimCancel 
Instance details

Defined in LndClient.Data.FundingShimCancel

Associated Types

type Rep FundingShimCancel :: Type -> Type #

Methods

from :: FundingShimCancel -> Rep FundingShimCancel x #

to :: Rep FundingShimCancel x -> FundingShimCancel #

Generic FundingStateStepRequest 
Instance details

Defined in LndClient.Data.FundingStateStep

Associated Types

type Rep FundingStateStepRequest :: Type -> Type #

Methods

from :: FundingStateStepRequest -> Rep FundingStateStepRequest x #

to :: Rep FundingStateStepRequest x -> FundingStateStepRequest #

Generic GetInfoResponse 
Instance details

Defined in LndClient.Data.GetInfo

Associated Types

type Rep GetInfoResponse :: Type -> Type #

Methods

from :: GetInfoResponse -> Rep GetInfoResponse x #

to :: Rep GetInfoResponse x -> GetInfoResponse #

Generic EventType 
Instance details

Defined in LndClient.Data.HtlcEvent

Associated Types

type Rep EventType :: Type -> Type #

Methods

from :: EventType -> Rep EventType x #

to :: Rep EventType x -> EventType #

Generic HtlcEvent 
Instance details

Defined in LndClient.Data.HtlcEvent

Associated Types

type Rep HtlcEvent :: Type -> Type #

Methods

from :: HtlcEvent -> Rep HtlcEvent x #

to :: Rep HtlcEvent x -> HtlcEvent #

Generic Invoice 
Instance details

Defined in LndClient.Data.Invoice

Associated Types

type Rep Invoice :: Type -> Type #

Methods

from :: Invoice -> Rep Invoice x #

to :: Rep Invoice x -> Invoice #

Generic InvoiceState 
Instance details

Defined in LndClient.Data.Invoice

Associated Types

type Rep InvoiceState :: Type -> Type #

Methods

from :: InvoiceState -> Rep InvoiceState x #

to :: Rep InvoiceState x -> InvoiceState #

Generic LeaseOutputRequest 
Instance details

Defined in LndClient.Data.LeaseOutput

Associated Types

type Rep LeaseOutputRequest :: Type -> Type #

Methods

from :: LeaseOutputRequest -> Rep LeaseOutputRequest x #

to :: Rep LeaseOutputRequest x -> LeaseOutputRequest #

Generic LeaseOutputResponse 
Instance details

Defined in LndClient.Data.LeaseOutput

Associated Types

type Rep LeaseOutputResponse :: Type -> Type #

Methods

from :: LeaseOutputResponse -> Rep LeaseOutputResponse x #

to :: Rep LeaseOutputResponse x -> LeaseOutputResponse #

Generic ListChannelsRequest 
Instance details

Defined in LndClient.Data.ListChannels

Associated Types

type Rep ListChannelsRequest :: Type -> Type #

Methods

from :: ListChannelsRequest -> Rep ListChannelsRequest x #

to :: Rep ListChannelsRequest x -> ListChannelsRequest #

Generic ListInvoiceRequest 
Instance details

Defined in LndClient.Data.ListInvoices

Associated Types

type Rep ListInvoiceRequest :: Type -> Type #

Methods

from :: ListInvoiceRequest -> Rep ListInvoiceRequest x #

to :: Rep ListInvoiceRequest x -> ListInvoiceRequest #

Generic ListInvoiceResponse 
Instance details

Defined in LndClient.Data.ListInvoices

Associated Types

type Rep ListInvoiceResponse :: Type -> Type #

Methods

from :: ListInvoiceResponse -> Rep ListInvoiceResponse x #

to :: Rep ListInvoiceResponse x -> ListInvoiceResponse #

Generic ListLeasesRequest 
Instance details

Defined in LndClient.Data.ListLeases

Associated Types

type Rep ListLeasesRequest :: Type -> Type #

Methods

from :: ListLeasesRequest -> Rep ListLeasesRequest x #

to :: Rep ListLeasesRequest x -> ListLeasesRequest #

Generic ListLeasesResponse 
Instance details

Defined in LndClient.Data.ListLeases

Associated Types

type Rep ListLeasesResponse :: Type -> Type #

Methods

from :: ListLeasesResponse -> Rep ListLeasesResponse x #

to :: Rep ListLeasesResponse x -> ListLeasesResponse #

Generic UtxoLease 
Instance details

Defined in LndClient.Data.ListLeases

Associated Types

type Rep UtxoLease :: Type -> Type #

Methods

from :: UtxoLease -> Rep UtxoLease x #

to :: Rep UtxoLease x -> UtxoLease #

Generic ListUnspentRequest 
Instance details

Defined in LndClient.Data.ListUnspent

Associated Types

type Rep ListUnspentRequest :: Type -> Type #

Methods

from :: ListUnspentRequest -> Rep ListUnspentRequest x #

to :: Rep ListUnspentRequest x -> ListUnspentRequest #

Generic ListUnspentResponse 
Instance details

Defined in LndClient.Data.ListUnspent

Associated Types

type Rep ListUnspentResponse :: Type -> Type #

Methods

from :: ListUnspentResponse -> Rep ListUnspentResponse x #

to :: Rep ListUnspentResponse x -> ListUnspentResponse #

Generic Utxo 
Instance details

Defined in LndClient.Data.ListUnspent

Associated Types

type Rep Utxo :: Type -> Type #

Methods

from :: Utxo -> Rep Utxo x #

to :: Rep Utxo x -> Utxo #

Generic LndHost' 
Instance details

Defined in LndClient.Data.LndEnv

Associated Types

type Rep LndHost' :: Type -> Type #

Methods

from :: LndHost' -> Rep LndHost' x #

to :: Rep LndHost' x -> LndHost' #

Generic LndPort' 
Instance details

Defined in LndClient.Data.LndEnv

Associated Types

type Rep LndPort' :: Type -> Type #

Methods

from :: LndPort' -> Rep LndPort' x #

to :: Rep LndPort' x -> LndPort' #

Generic RawConfig 
Instance details

Defined in LndClient.Data.LndEnv

Associated Types

type Rep RawConfig :: Type -> Type #

Methods

from :: RawConfig -> Rep RawConfig x #

to :: Rep RawConfig x -> RawConfig #

Generic AddressType 
Instance details

Defined in LndClient.Data.NewAddress

Associated Types

type Rep AddressType :: Type -> Type #

Methods

from :: AddressType -> Rep AddressType x #

to :: Rep AddressType x -> AddressType #

Generic NewAddressRequest 
Instance details

Defined in LndClient.Data.NewAddress

Associated Types

type Rep NewAddressRequest :: Type -> Type #

Methods

from :: NewAddressRequest -> Rep NewAddressRequest x #

to :: Rep NewAddressRequest x -> NewAddressRequest #

Generic NewAddressResponse 
Instance details

Defined in LndClient.Data.NewAddress

Associated Types

type Rep NewAddressResponse :: Type -> Type #

Methods

from :: NewAddressResponse -> Rep NewAddressResponse x #

to :: Rep NewAddressResponse x -> NewAddressResponse #

Generic AddIndex 
Instance details

Defined in LndClient.Data.Newtype

Associated Types

type Rep AddIndex :: Type -> Type #

Methods

from :: AddIndex -> Rep AddIndex x #

to :: Rep AddIndex x -> AddIndex #

Generic ChanId 
Instance details

Defined in LndClient.Data.Newtype

Associated Types

type Rep ChanId :: Type -> Type #

Methods

from :: ChanId -> Rep ChanId x #

to :: Rep ChanId x -> ChanId #

Generic MSat 
Instance details

Defined in LndClient.Data.Newtype

Associated Types

type Rep MSat :: Type -> Type #

Methods

from :: MSat -> Rep MSat x #

to :: Rep MSat x -> MSat #

Generic NodeLocation 
Instance details

Defined in LndClient.Data.Newtype

Associated Types

type Rep NodeLocation :: Type -> Type #

Methods

from :: NodeLocation -> Rep NodeLocation x #

to :: Rep NodeLocation x -> NodeLocation #

Generic NodePubKey 
Instance details

Defined in LndClient.Data.Newtype

Associated Types

type Rep NodePubKey :: Type -> Type #

Generic PaymentRequest 
Instance details

Defined in LndClient.Data.Newtype

Associated Types

type Rep PaymentRequest :: Type -> Type #

Methods

from :: PaymentRequest -> Rep PaymentRequest x #

to :: Rep PaymentRequest x -> PaymentRequest #

Generic PendingChannelId 
Instance details

Defined in LndClient.Data.Newtype

Associated Types

type Rep PendingChannelId :: Type -> Type #

Methods

from :: PendingChannelId -> Rep PendingChannelId x #

to :: Rep PendingChannelId x -> PendingChannelId #

Generic Psbt 
Instance details

Defined in LndClient.Data.Newtype

Associated Types

type Rep Psbt :: Type -> Type #

Methods

from :: Psbt -> Rep Psbt x #

to :: Rep Psbt x -> Psbt #

Generic RHash 
Instance details

Defined in LndClient.Data.Newtype

Associated Types

type Rep RHash :: Type -> Type #

Methods

from :: RHash -> Rep RHash x #

to :: Rep RHash x -> RHash #

Generic RPreimage 
Instance details

Defined in LndClient.Data.Newtype

Associated Types

type Rep RPreimage :: Type -> Type #

Generic RawTx 
Instance details

Defined in LndClient.Data.Newtype

Associated Types

type Rep RawTx :: Type -> Type #

Methods

from :: RawTx -> Rep RawTx x #

to :: Rep RawTx x -> RawTx #

Generic Seconds 
Instance details

Defined in LndClient.Data.Newtype

Associated Types

type Rep Seconds :: Type -> Type #

Methods

from :: Seconds -> Rep Seconds x #

to :: Rep Seconds x -> Seconds #

Generic SettleIndex 
Instance details

Defined in LndClient.Data.Newtype

Associated Types

type Rep SettleIndex :: Type -> Type #

Methods

from :: SettleIndex -> Rep SettleIndex x #

to :: Rep SettleIndex x -> SettleIndex #

Generic ChannelOpenUpdate 
Instance details

Defined in LndClient.Data.OpenChannel

Associated Types

type Rep ChannelOpenUpdate :: Type -> Type #

Methods

from :: ChannelOpenUpdate -> Rep ChannelOpenUpdate x #

to :: Rep ChannelOpenUpdate x -> ChannelOpenUpdate #

Generic OpenChannelRequest 
Instance details

Defined in LndClient.Data.OpenChannel

Associated Types

type Rep OpenChannelRequest :: Type -> Type #

Methods

from :: OpenChannelRequest -> Rep OpenChannelRequest x #

to :: Rep OpenChannelRequest x -> OpenChannelRequest #

Generic OpenStatusUpdate 
Instance details

Defined in LndClient.Data.OpenChannel

Associated Types

type Rep OpenStatusUpdate :: Type -> Type #

Methods

from :: OpenStatusUpdate -> Rep OpenStatusUpdate x #

to :: Rep OpenStatusUpdate x -> OpenStatusUpdate #

Generic OpenStatusUpdate' 
Instance details

Defined in LndClient.Data.OpenChannel

Associated Types

type Rep OpenStatusUpdate' :: Type -> Type #

Methods

from :: OpenStatusUpdate' -> Rep OpenStatusUpdate' x #

to :: Rep OpenStatusUpdate' x -> OpenStatusUpdate' #

Generic ReadyForPsbtFunding 
Instance details

Defined in LndClient.Data.OpenChannel

Associated Types

type Rep ReadyForPsbtFunding :: Type -> Type #

Methods

from :: ReadyForPsbtFunding -> Rep ReadyForPsbtFunding x #

to :: Rep ReadyForPsbtFunding x -> ReadyForPsbtFunding #

Generic OutPoint 
Instance details

Defined in LndClient.Data.OutPoint

Associated Types

type Rep OutPoint :: Type -> Type #

Methods

from :: OutPoint -> Rep OutPoint x #

to :: Rep OutPoint x -> OutPoint #

Generic PayReq 
Instance details

Defined in LndClient.Data.PayReq

Associated Types

type Rep PayReq :: Type -> Type #

Methods

from :: PayReq -> Rep PayReq x #

to :: Rep PayReq x -> PayReq #

Generic Payment 
Instance details

Defined in LndClient.Data.Payment

Associated Types

type Rep Payment :: Type -> Type #

Methods

from :: Payment -> Rep Payment x #

to :: Rep Payment x -> Payment #

Generic PaymentStatus 
Instance details

Defined in LndClient.Data.Payment

Associated Types

type Rep PaymentStatus :: Type -> Type #

Methods

from :: PaymentStatus -> Rep PaymentStatus x #

to :: Rep PaymentStatus x -> PaymentStatus #

Generic ConnectPeerRequest 
Instance details

Defined in LndClient.Data.Peer

Associated Types

type Rep ConnectPeerRequest :: Type -> Type #

Methods

from :: ConnectPeerRequest -> Rep ConnectPeerRequest x #

to :: Rep ConnectPeerRequest x -> ConnectPeerRequest #

Generic LightningAddress 
Instance details

Defined in LndClient.Data.Peer

Associated Types

type Rep LightningAddress :: Type -> Type #

Methods

from :: LightningAddress -> Rep LightningAddress x #

to :: Rep LightningAddress x -> LightningAddress #

Generic Peer 
Instance details

Defined in LndClient.Data.Peer

Associated Types

type Rep Peer :: Type -> Type #

Methods

from :: Peer -> Rep Peer x #

to :: Rep Peer x -> Peer #

Generic PendingChannel 
Instance details

Defined in LndClient.Data.PendingChannel

Associated Types

type Rep PendingChannel :: Type -> Type #

Methods

from :: PendingChannel -> Rep PendingChannel x #

to :: Rep PendingChannel x -> PendingChannel #

Generic PendingChannelsResponse 
Instance details

Defined in LndClient.Data.PendingChannels

Associated Types

type Rep PendingChannelsResponse :: Type -> Type #

Methods

from :: PendingChannelsResponse -> Rep PendingChannelsResponse x #

to :: Rep PendingChannelsResponse x -> PendingChannelsResponse #

Generic PendingOpenChannel 
Instance details

Defined in LndClient.Data.PendingOpenChannel

Associated Types

type Rep PendingOpenChannel :: Type -> Type #

Methods

from :: PendingOpenChannel -> Rep PendingOpenChannel x #

to :: Rep PendingOpenChannel x -> PendingOpenChannel #

Generic PsbtShim 
Instance details

Defined in LndClient.Data.PsbtShim

Associated Types

type Rep PsbtShim :: Type -> Type #

Methods

from :: PsbtShim -> Rep PsbtShim x #

to :: Rep PsbtShim x -> PsbtShim #

Generic PublishTransactionRequest 
Instance details

Defined in LndClient.Data.PublishTransaction

Associated Types

type Rep PublishTransactionRequest :: Type -> Type #

Methods

from :: PublishTransactionRequest -> Rep PublishTransactionRequest x #

to :: Rep PublishTransactionRequest x -> PublishTransactionRequest #

Generic PublishTransactionResponse 
Instance details

Defined in LndClient.Data.PublishTransaction

Associated Types

type Rep PublishTransactionResponse :: Type -> Type #

Methods

from :: PublishTransactionResponse -> Rep PublishTransactionResponse x #

to :: Rep PublishTransactionResponse x -> PublishTransactionResponse #

Generic ReleaseOutputRequest 
Instance details

Defined in LndClient.Data.ReleaseOutput

Associated Types

type Rep ReleaseOutputRequest :: Type -> Type #

Methods

from :: ReleaseOutputRequest -> Rep ReleaseOutputRequest x #

to :: Rep ReleaseOutputRequest x -> ReleaseOutputRequest #

Generic ReleaseOutputResponse 
Instance details

Defined in LndClient.Data.ReleaseOutput

Associated Types

type Rep ReleaseOutputResponse :: Type -> Type #

Methods

from :: ReleaseOutputResponse -> Rep ReleaseOutputResponse x #

to :: Rep ReleaseOutputResponse x -> ReleaseOutputResponse #

Generic SendCoinsRequest 
Instance details

Defined in LndClient.Data.SendCoins

Associated Types

type Rep SendCoinsRequest :: Type -> Type #

Methods

from :: SendCoinsRequest -> Rep SendCoinsRequest x #

to :: Rep SendCoinsRequest x -> SendCoinsRequest #

Generic SendCoinsResponse 
Instance details

Defined in LndClient.Data.SendCoins

Associated Types

type Rep SendCoinsResponse :: Type -> Type #

Methods

from :: SendCoinsResponse -> Rep SendCoinsResponse x #

to :: Rep SendCoinsResponse x -> SendCoinsResponse #

Generic SendPaymentRequest 
Instance details

Defined in LndClient.Data.SendPayment

Associated Types

type Rep SendPaymentRequest :: Type -> Type #

Methods

from :: SendPaymentRequest -> Rep SendPaymentRequest x #

to :: Rep SendPaymentRequest x -> SendPaymentRequest #

Generic SendPaymentResponse 
Instance details

Defined in LndClient.Data.SendPayment

Associated Types

type Rep SendPaymentResponse :: Type -> Type #

Methods

from :: SendPaymentResponse -> Rep SendPaymentResponse x #

to :: Rep SendPaymentResponse x -> SendPaymentResponse #

Generic KeyLocator 
Instance details

Defined in LndClient.Data.SignMessage

Associated Types

type Rep KeyLocator :: Type -> Type #

Methods

from :: KeyLocator -> Rep KeyLocator x #

to :: Rep KeyLocator x -> KeyLocator #

Generic SignMessageRequest 
Instance details

Defined in LndClient.Data.SignMessage

Associated Types

type Rep SignMessageRequest :: Type -> Type #

Methods

from :: SignMessageRequest -> Rep SignMessageRequest x #

to :: Rep SignMessageRequest x -> SignMessageRequest #

Generic SignMessageResponse 
Instance details

Defined in LndClient.Data.SignMessage

Associated Types

type Rep SignMessageResponse :: Type -> Type #

Methods

from :: SignMessageResponse -> Rep SignMessageResponse x #

to :: Rep SignMessageResponse x -> SignMessageResponse #

Generic ChannelEventUpdate 
Instance details

Defined in LndClient.Data.SubscribeChannelEvents

Associated Types

type Rep ChannelEventUpdate :: Type -> Type #

Methods

from :: ChannelEventUpdate -> Rep ChannelEventUpdate x #

to :: Rep ChannelEventUpdate x -> ChannelEventUpdate #

Generic UpdateChannel 
Instance details

Defined in LndClient.Data.SubscribeChannelEvents

Associated Types

type Rep UpdateChannel :: Type -> Type #

Methods

from :: UpdateChannel -> Rep UpdateChannel x #

to :: Rep UpdateChannel x -> UpdateChannel #

Generic UpdateType 
Instance details

Defined in LndClient.Data.SubscribeChannelEvents

Associated Types

type Rep UpdateType :: Type -> Type #

Methods

from :: UpdateType -> Rep UpdateType x #

to :: Rep UpdateType x -> UpdateType #

Generic SubscribeInvoicesRequest 
Instance details

Defined in LndClient.Data.SubscribeInvoices

Associated Types

type Rep SubscribeInvoicesRequest :: Type -> Type #

Methods

from :: SubscribeInvoicesRequest -> Rep SubscribeInvoicesRequest x #

to :: Rep SubscribeInvoicesRequest x -> SubscribeInvoicesRequest #

Generic TrackPaymentRequest 
Instance details

Defined in LndClient.Data.TrackPayment

Associated Types

type Rep TrackPaymentRequest :: Type -> Type #

Methods

from :: TrackPaymentRequest -> Rep TrackPaymentRequest x #

to :: Rep TrackPaymentRequest x -> TrackPaymentRequest #

Generic LnInitiator 
Instance details

Defined in LndClient.Data.Type

Associated Types

type Rep LnInitiator :: Type -> Type #

Methods

from :: LnInitiator -> Rep LnInitiator x #

to :: Rep LnInitiator x -> LnInitiator #

Generic LndError 
Instance details

Defined in LndClient.Data.Type

Associated Types

type Rep LndError :: Type -> Type #

Methods

from :: LndError -> Rep LndError x #

to :: Rep LndError x -> LndError #

Generic LoggingMeta 
Instance details

Defined in LndClient.Data.Type

Associated Types

type Rep LoggingMeta :: Type -> Type #

Methods

from :: LoggingMeta -> Rep LoggingMeta x #

to :: Rep LoggingMeta x -> LoggingMeta #

Generic VerifyMessageRequest 
Instance details

Defined in LndClient.Data.VerifyMessage

Associated Types

type Rep VerifyMessageRequest :: Type -> Type #

Methods

from :: VerifyMessageRequest -> Rep VerifyMessageRequest x #

to :: Rep VerifyMessageRequest x -> VerifyMessageRequest #

Generic VerifyMessageResponse 
Instance details

Defined in LndClient.Data.VerifyMessage

Associated Types

type Rep VerifyMessageResponse :: Type -> Type #

Methods

from :: VerifyMessageResponse -> Rep VerifyMessageResponse x #

to :: Rep VerifyMessageResponse x -> VerifyMessageResponse #

Generic WaitingCloseChannel 
Instance details

Defined in LndClient.Data.WaitingCloseChannel

Associated Types

type Rep WaitingCloseChannel :: Type -> Type #

Methods

from :: WaitingCloseChannel -> Rep WaitingCloseChannel x #

to :: Rep WaitingCloseChannel x -> WaitingCloseChannel #

Generic WalletBalance 
Instance details

Defined in LndClient.Data.WalletBalance

Associated Types

type Rep WalletBalance :: Type -> Type #

Methods

from :: WalletBalance -> Rep WalletBalance x #

to :: Rep WalletBalance x -> WalletBalance #

Generic RpcName 
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 AddHoldInvoiceRequest 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Associated Types

type Rep AddHoldInvoiceRequest :: Type -> Type #

Methods

from :: AddHoldInvoiceRequest -> Rep AddHoldInvoiceRequest x #

to :: Rep AddHoldInvoiceRequest x -> AddHoldInvoiceRequest #

Generic AddHoldInvoiceResp 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Associated Types

type Rep AddHoldInvoiceResp :: Type -> Type #

Methods

from :: AddHoldInvoiceResp -> Rep AddHoldInvoiceResp x #

to :: Rep AddHoldInvoiceResp x -> AddHoldInvoiceResp #

Generic CancelInvoiceMsg 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Associated Types

type Rep CancelInvoiceMsg :: Type -> Type #

Methods

from :: CancelInvoiceMsg -> Rep CancelInvoiceMsg x #

to :: Rep CancelInvoiceMsg x -> CancelInvoiceMsg #

Generic CancelInvoiceResp 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Associated Types

type Rep CancelInvoiceResp :: Type -> Type #

Methods

from :: CancelInvoiceResp -> Rep CancelInvoiceResp x #

to :: Rep CancelInvoiceResp x -> CancelInvoiceResp #

Generic LookupInvoiceMsg 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Associated Types

type Rep LookupInvoiceMsg :: Type -> Type #

Methods

from :: LookupInvoiceMsg -> Rep LookupInvoiceMsg x #

to :: Rep LookupInvoiceMsg x -> LookupInvoiceMsg #

Generic LookupInvoiceMsg'InvoiceRef 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Associated Types

type Rep LookupInvoiceMsg'InvoiceRef :: Type -> Type #

Methods

from :: LookupInvoiceMsg'InvoiceRef -> Rep LookupInvoiceMsg'InvoiceRef x #

to :: Rep LookupInvoiceMsg'InvoiceRef x -> LookupInvoiceMsg'InvoiceRef #

Generic LookupModifier 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Associated Types

type Rep LookupModifier :: Type -> Type #

Methods

from :: LookupModifier -> Rep LookupModifier x #

to :: Rep LookupModifier x -> LookupModifier #

Generic LookupModifier'UnrecognizedValue 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Associated Types

type Rep LookupModifier'UnrecognizedValue :: Type -> Type #

Methods

from :: LookupModifier'UnrecognizedValue -> Rep LookupModifier'UnrecognizedValue x #

to :: Rep LookupModifier'UnrecognizedValue x -> LookupModifier'UnrecognizedValue #

Generic SettleInvoiceMsg 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Associated Types

type Rep SettleInvoiceMsg :: Type -> Type #

Methods

from :: SettleInvoiceMsg -> Rep SettleInvoiceMsg x #

to :: Rep SettleInvoiceMsg x -> SettleInvoiceMsg #

Generic SettleInvoiceResp 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Associated Types

type Rep SettleInvoiceResp :: Type -> Type #

Methods

from :: SettleInvoiceResp -> Rep SettleInvoiceResp x #

to :: Rep SettleInvoiceResp x -> SettleInvoiceResp #

Generic SubscribeSingleInvoiceRequest 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Associated Types

type Rep SubscribeSingleInvoiceRequest :: Type -> Type #

Methods

from :: SubscribeSingleInvoiceRequest -> Rep SubscribeSingleInvoiceRequest x #

to :: Rep SubscribeSingleInvoiceRequest x -> SubscribeSingleInvoiceRequest #

Generic AddressType 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep AddressType :: Type -> Type #

Methods

from :: AddressType -> Rep AddressType x #

to :: Rep AddressType x -> AddressType #

Generic AddressType'UnrecognizedValue 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep AddressType'UnrecognizedValue :: Type -> Type #

Methods

from :: AddressType'UnrecognizedValue -> Rep AddressType'UnrecognizedValue x #

to :: Rep AddressType'UnrecognizedValue x -> AddressType'UnrecognizedValue #

Generic BatchOpenChannel 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep BatchOpenChannel :: Type -> Type #

Methods

from :: BatchOpenChannel -> Rep BatchOpenChannel x #

to :: Rep BatchOpenChannel x -> BatchOpenChannel #

Generic BatchOpenChannelRequest 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep BatchOpenChannelRequest :: Type -> Type #

Methods

from :: BatchOpenChannelRequest -> Rep BatchOpenChannelRequest x #

to :: Rep BatchOpenChannelRequest x -> BatchOpenChannelRequest #

Generic BatchOpenChannelResponse 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep BatchOpenChannelResponse :: Type -> Type #

Methods

from :: BatchOpenChannelResponse -> Rep BatchOpenChannelResponse x #

to :: Rep BatchOpenChannelResponse x -> BatchOpenChannelResponse #

Generic Chain 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep Chain :: Type -> Type #

Methods

from :: Chain -> Rep Chain x #

to :: Rep Chain x -> Chain #

Generic ChannelAcceptRequest 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep ChannelAcceptRequest :: Type -> Type #

Methods

from :: ChannelAcceptRequest -> Rep ChannelAcceptRequest x #

to :: Rep ChannelAcceptRequest x -> ChannelAcceptRequest #

Generic ChannelAcceptResponse 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep ChannelAcceptResponse :: Type -> Type #

Methods

from :: ChannelAcceptResponse -> Rep ChannelAcceptResponse x #

to :: Rep ChannelAcceptResponse x -> ChannelAcceptResponse #

Generic ChannelCloseUpdate 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep ChannelCloseUpdate :: Type -> Type #

Methods

from :: ChannelCloseUpdate -> Rep ChannelCloseUpdate x #

to :: Rep ChannelCloseUpdate x -> ChannelCloseUpdate #

Generic ChannelOpenUpdate 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep ChannelOpenUpdate :: Type -> Type #

Methods

from :: ChannelOpenUpdate -> Rep ChannelOpenUpdate x #

to :: Rep ChannelOpenUpdate x -> ChannelOpenUpdate #

Generic CloseChannelRequest 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep CloseChannelRequest :: Type -> Type #

Methods

from :: CloseChannelRequest -> Rep CloseChannelRequest x #

to :: Rep CloseChannelRequest x -> CloseChannelRequest #

Generic CloseStatusUpdate 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep CloseStatusUpdate :: Type -> Type #

Methods

from :: CloseStatusUpdate -> Rep CloseStatusUpdate x #

to :: Rep CloseStatusUpdate x -> CloseStatusUpdate #

Generic CloseStatusUpdate'Update 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep CloseStatusUpdate'Update :: Type -> Type #

Methods

from :: CloseStatusUpdate'Update -> Rep CloseStatusUpdate'Update x #

to :: Rep CloseStatusUpdate'Update x -> CloseStatusUpdate'Update #

Generic ClosedChannelsRequest 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep ClosedChannelsRequest :: Type -> Type #

Methods

from :: ClosedChannelsRequest -> Rep ClosedChannelsRequest x #

to :: Rep ClosedChannelsRequest x -> ClosedChannelsRequest #

Generic ClosedChannelsResponse 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep ClosedChannelsResponse :: Type -> Type #

Methods

from :: ClosedChannelsResponse -> Rep ClosedChannelsResponse x #

to :: Rep ClosedChannelsResponse x -> ClosedChannelsResponse #

Generic ConfirmationUpdate 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep ConfirmationUpdate :: Type -> Type #

Methods

from :: ConfirmationUpdate -> Rep ConfirmationUpdate x #

to :: Rep ConfirmationUpdate x -> ConfirmationUpdate #

Generic ConnectPeerRequest 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep ConnectPeerRequest :: Type -> Type #

Methods

from :: ConnectPeerRequest -> Rep ConnectPeerRequest x #

to :: Rep ConnectPeerRequest x -> ConnectPeerRequest #

Generic ConnectPeerResponse 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep ConnectPeerResponse :: Type -> Type #

Methods

from :: ConnectPeerResponse -> Rep ConnectPeerResponse x #

to :: Rep ConnectPeerResponse x -> ConnectPeerResponse #

Generic CustomMessage 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep CustomMessage :: Type -> Type #

Methods

from :: CustomMessage -> Rep CustomMessage x #

to :: Rep CustomMessage x -> CustomMessage #

Generic DisconnectPeerRequest 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep DisconnectPeerRequest :: Type -> Type #

Methods

from :: DisconnectPeerRequest -> Rep DisconnectPeerRequest x #

to :: Rep DisconnectPeerRequest x -> DisconnectPeerRequest #

Generic DisconnectPeerResponse 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep DisconnectPeerResponse :: Type -> Type #

Methods

from :: DisconnectPeerResponse -> Rep DisconnectPeerResponse x #

to :: Rep DisconnectPeerResponse x -> DisconnectPeerResponse #

Generic EstimateFeeRequest 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep EstimateFeeRequest :: Type -> Type #

Methods

from :: EstimateFeeRequest -> Rep EstimateFeeRequest x #

to :: Rep EstimateFeeRequest x -> EstimateFeeRequest #

Generic EstimateFeeRequest'AddrToAmountEntry 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep EstimateFeeRequest'AddrToAmountEntry :: Type -> Type #

Methods

from :: EstimateFeeRequest'AddrToAmountEntry -> Rep EstimateFeeRequest'AddrToAmountEntry x #

to :: Rep EstimateFeeRequest'AddrToAmountEntry x -> EstimateFeeRequest'AddrToAmountEntry #

Generic EstimateFeeResponse 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep EstimateFeeResponse :: Type -> Type #

Methods

from :: EstimateFeeResponse -> Rep EstimateFeeResponse x #

to :: Rep EstimateFeeResponse x -> EstimateFeeResponse #

Generic GetInfoRequest 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep GetInfoRequest :: Type -> Type #

Methods

from :: GetInfoRequest -> Rep GetInfoRequest x #

to :: Rep GetInfoRequest x -> GetInfoRequest #

Generic GetInfoResponse 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep GetInfoResponse :: Type -> Type #

Methods

from :: GetInfoResponse -> Rep GetInfoResponse x #

to :: Rep GetInfoResponse x -> GetInfoResponse #

Generic GetInfoResponse'FeaturesEntry 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep GetInfoResponse'FeaturesEntry :: Type -> Type #

Methods

from :: GetInfoResponse'FeaturesEntry -> Rep GetInfoResponse'FeaturesEntry x #

to :: Rep GetInfoResponse'FeaturesEntry x -> GetInfoResponse'FeaturesEntry #

Generic GetRecoveryInfoRequest 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep GetRecoveryInfoRequest :: Type -> Type #

Methods

from :: GetRecoveryInfoRequest -> Rep GetRecoveryInfoRequest x #

to :: Rep GetRecoveryInfoRequest x -> GetRecoveryInfoRequest #

Generic GetRecoveryInfoResponse 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep GetRecoveryInfoResponse :: Type -> Type #

Methods

from :: GetRecoveryInfoResponse -> Rep GetRecoveryInfoResponse x #

to :: Rep GetRecoveryInfoResponse x -> GetRecoveryInfoResponse #

Generic GetTransactionsRequest 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep GetTransactionsRequest :: Type -> Type #

Methods

from :: GetTransactionsRequest -> Rep GetTransactionsRequest x #

to :: Rep GetTransactionsRequest x -> GetTransactionsRequest #

Generic LightningAddress 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep LightningAddress :: Type -> Type #

Methods

from :: LightningAddress -> Rep LightningAddress x #

to :: Rep LightningAddress x -> LightningAddress #

Generic ListChannelsRequest 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep ListChannelsRequest :: Type -> Type #

Methods

from :: ListChannelsRequest -> Rep ListChannelsRequest x #

to :: Rep ListChannelsRequest x -> ListChannelsRequest #

Generic ListChannelsResponse 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep ListChannelsResponse :: Type -> Type #

Methods

from :: ListChannelsResponse -> Rep ListChannelsResponse x #

to :: Rep ListChannelsResponse x -> ListChannelsResponse #

Generic ListPeersRequest 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep ListPeersRequest :: Type -> Type #

Methods

from :: ListPeersRequest -> Rep ListPeersRequest x #

to :: Rep ListPeersRequest x -> ListPeersRequest #

Generic ListPeersResponse 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep ListPeersResponse :: Type -> Type #

Methods

from :: ListPeersResponse -> Rep ListPeersResponse x #

to :: Rep ListPeersResponse x -> ListPeersResponse #

Generic ListUnspentRequest 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep ListUnspentRequest :: Type -> Type #

Methods

from :: ListUnspentRequest -> Rep ListUnspentRequest x #

to :: Rep ListUnspentRequest x -> ListUnspentRequest #

Generic ListUnspentResponse 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep ListUnspentResponse :: Type -> Type #

Methods

from :: ListUnspentResponse -> Rep ListUnspentResponse x #

to :: Rep ListUnspentResponse x -> ListUnspentResponse #

Generic NewAddressRequest 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep NewAddressRequest :: Type -> Type #

Methods

from :: NewAddressRequest -> Rep NewAddressRequest x #

to :: Rep NewAddressRequest x -> NewAddressRequest #

Generic NewAddressResponse 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep NewAddressResponse :: Type -> Type #

Methods

from :: NewAddressResponse -> Rep NewAddressResponse x #

to :: Rep NewAddressResponse x -> NewAddressResponse #

Generic OpenChannelRequest 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep OpenChannelRequest :: Type -> Type #

Methods

from :: OpenChannelRequest -> Rep OpenChannelRequest x #

to :: Rep OpenChannelRequest x -> OpenChannelRequest #

Generic OpenStatusUpdate 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep OpenStatusUpdate :: Type -> Type #

Methods

from :: OpenStatusUpdate -> Rep OpenStatusUpdate x #

to :: Rep OpenStatusUpdate x -> OpenStatusUpdate #

Generic OpenStatusUpdate'Update 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep OpenStatusUpdate'Update :: Type -> Type #

Methods

from :: OpenStatusUpdate'Update -> Rep OpenStatusUpdate'Update x #

to :: Rep OpenStatusUpdate'Update x -> OpenStatusUpdate'Update #

Generic Peer 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep Peer :: Type -> Type #

Methods

from :: Peer -> Rep Peer x #

to :: Rep Peer x -> Peer #

Generic Peer'FeaturesEntry 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep Peer'FeaturesEntry :: Type -> Type #

Methods

from :: Peer'FeaturesEntry -> Rep Peer'FeaturesEntry x #

to :: Rep Peer'FeaturesEntry x -> Peer'FeaturesEntry #

Generic Peer'SyncType 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep Peer'SyncType :: Type -> Type #

Methods

from :: Peer'SyncType -> Rep Peer'SyncType x #

to :: Rep Peer'SyncType x -> Peer'SyncType #

Generic Peer'SyncType'UnrecognizedValue 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep Peer'SyncType'UnrecognizedValue :: Type -> Type #

Methods

from :: Peer'SyncType'UnrecognizedValue -> Rep Peer'SyncType'UnrecognizedValue x #

to :: Rep Peer'SyncType'UnrecognizedValue x -> Peer'SyncType'UnrecognizedValue #

Generic PeerEvent 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep PeerEvent :: Type -> Type #

Methods

from :: PeerEvent -> Rep PeerEvent x #

to :: Rep PeerEvent x -> PeerEvent #

Generic PeerEvent'EventType 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep PeerEvent'EventType :: Type -> Type #

Methods

from :: PeerEvent'EventType -> Rep PeerEvent'EventType x #

to :: Rep PeerEvent'EventType x -> PeerEvent'EventType #

Generic PeerEvent'EventType'UnrecognizedValue 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep PeerEvent'EventType'UnrecognizedValue :: Type -> Type #

Methods

from :: PeerEvent'EventType'UnrecognizedValue -> Rep PeerEvent'EventType'UnrecognizedValue x #

to :: Rep PeerEvent'EventType'UnrecognizedValue x -> PeerEvent'EventType'UnrecognizedValue #

Generic PeerEventSubscription 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep PeerEventSubscription :: Type -> Type #

Methods

from :: PeerEventSubscription -> Rep PeerEventSubscription x #

to :: Rep PeerEventSubscription x -> PeerEventSubscription #

Generic ReadyForPsbtFunding 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep ReadyForPsbtFunding :: Type -> Type #

Methods

from :: ReadyForPsbtFunding -> Rep ReadyForPsbtFunding x #

to :: Rep ReadyForPsbtFunding x -> ReadyForPsbtFunding #

Generic SendCoinsRequest 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep SendCoinsRequest :: Type -> Type #

Methods

from :: SendCoinsRequest -> Rep SendCoinsRequest x #

to :: Rep SendCoinsRequest x -> SendCoinsRequest #

Generic SendCoinsResponse 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep SendCoinsResponse :: Type -> Type #

Methods

from :: SendCoinsResponse -> Rep SendCoinsResponse x #

to :: Rep SendCoinsResponse x -> SendCoinsResponse #

Generic SendCustomMessageRequest 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep SendCustomMessageRequest :: Type -> Type #

Methods

from :: SendCustomMessageRequest -> Rep SendCustomMessageRequest x #

to :: Rep SendCustomMessageRequest x -> SendCustomMessageRequest #

Generic SendCustomMessageResponse 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep SendCustomMessageResponse :: Type -> Type #

Methods

from :: SendCustomMessageResponse -> Rep SendCustomMessageResponse x #

to :: Rep SendCustomMessageResponse x -> SendCustomMessageResponse #

Generic SendManyRequest 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep SendManyRequest :: Type -> Type #

Methods

from :: SendManyRequest -> Rep SendManyRequest x #

to :: Rep SendManyRequest x -> SendManyRequest #

Generic SendManyRequest'AddrToAmountEntry 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep SendManyRequest'AddrToAmountEntry :: Type -> Type #

Methods

from :: SendManyRequest'AddrToAmountEntry -> Rep SendManyRequest'AddrToAmountEntry x #

to :: Rep SendManyRequest'AddrToAmountEntry x -> SendManyRequest'AddrToAmountEntry #

Generic SendManyResponse 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep SendManyResponse :: Type -> Type #

Methods

from :: SendManyResponse -> Rep SendManyResponse x #

to :: Rep SendManyResponse x -> SendManyResponse #

Generic SendRequest 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep SendRequest :: Type -> Type #

Methods

from :: SendRequest -> Rep SendRequest x #

to :: Rep SendRequest x -> SendRequest #

Generic SendRequest'DestCustomRecordsEntry 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep SendRequest'DestCustomRecordsEntry :: Type -> Type #

Methods

from :: SendRequest'DestCustomRecordsEntry -> Rep SendRequest'DestCustomRecordsEntry x #

to :: Rep SendRequest'DestCustomRecordsEntry x -> SendRequest'DestCustomRecordsEntry #

Generic SendResponse 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep SendResponse :: Type -> Type #

Methods

from :: SendResponse -> Rep SendResponse x #

to :: Rep SendResponse x -> SendResponse #

Generic SendToRouteRequest 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep SendToRouteRequest :: Type -> Type #

Methods

from :: SendToRouteRequest -> Rep SendToRouteRequest x #

to :: Rep SendToRouteRequest x -> SendToRouteRequest #

Generic SignMessageRequest 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep SignMessageRequest :: Type -> Type #

Methods

from :: SignMessageRequest -> Rep SignMessageRequest x #

to :: Rep SignMessageRequest x -> SignMessageRequest #

Generic SignMessageResponse 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep SignMessageResponse :: Type -> Type #

Methods

from :: SignMessageResponse -> Rep SignMessageResponse x #

to :: Rep SignMessageResponse x -> SignMessageResponse #

Generic SubscribeCustomMessagesRequest 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep SubscribeCustomMessagesRequest :: Type -> Type #

Methods

from :: SubscribeCustomMessagesRequest -> Rep SubscribeCustomMessagesRequest x #

to :: Rep SubscribeCustomMessagesRequest x -> SubscribeCustomMessagesRequest #

Generic TimestampedError 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep TimestampedError :: Type -> Type #

Methods

from :: TimestampedError -> Rep TimestampedError x #

to :: Rep TimestampedError x -> TimestampedError #

Generic Transaction 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep Transaction :: Type -> Type #

Methods

from :: Transaction -> Rep Transaction x #

to :: Rep Transaction x -> Transaction #

Generic TransactionDetails 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep TransactionDetails :: Type -> Type #

Methods

from :: TransactionDetails -> Rep TransactionDetails x #

to :: Rep TransactionDetails x -> TransactionDetails #

Generic Utxo 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep Utxo :: Type -> Type #

Methods

from :: Utxo -> Rep Utxo x #

to :: Rep Utxo x -> Utxo #

Generic VerifyMessageRequest 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep VerifyMessageRequest :: Type -> Type #

Methods

from :: VerifyMessageRequest -> Rep VerifyMessageRequest x #

to :: Rep VerifyMessageRequest x -> VerifyMessageRequest #

Generic VerifyMessageResponse 
Instance details

Defined in Proto.Lightning

Associated Types

type Rep VerifyMessageResponse :: Type -> Type #

Methods

from :: VerifyMessageResponse -> Rep VerifyMessageResponse x #

to :: Rep VerifyMessageResponse x -> VerifyMessageResponse #

Generic AMPRecord 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep AMPRecord :: Type -> Type #

Methods

from :: AMPRecord -> Rep AMPRecord x #

to :: Rep AMPRecord x -> AMPRecord #

Generic Amount 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep Amount :: Type -> Type #

Methods

from :: Amount -> Rep Amount x #

to :: Rep Amount x -> Amount #

Generic ChanInfoRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep ChanInfoRequest :: Type -> Type #

Methods

from :: ChanInfoRequest -> Rep ChanInfoRequest x #

to :: Rep ChanInfoRequest x -> ChanInfoRequest #

Generic ChanPointShim 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep ChanPointShim :: Type -> Type #

Methods

from :: ChanPointShim -> Rep ChanPointShim x #

to :: Rep ChanPointShim x -> ChanPointShim #

Generic Channel 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep Channel :: Type -> Type #

Methods

from :: Channel -> Rep Channel x #

to :: Rep Channel x -> Channel #

Generic ChannelBalanceRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep ChannelBalanceRequest :: Type -> Type #

Methods

from :: ChannelBalanceRequest -> Rep ChannelBalanceRequest x #

to :: Rep ChannelBalanceRequest x -> ChannelBalanceRequest #

Generic ChannelBalanceResponse 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep ChannelBalanceResponse :: Type -> Type #

Methods

from :: ChannelBalanceResponse -> Rep ChannelBalanceResponse x #

to :: Rep ChannelBalanceResponse x -> ChannelBalanceResponse #

Generic ChannelCloseSummary 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep ChannelCloseSummary :: Type -> Type #

Methods

from :: ChannelCloseSummary -> Rep ChannelCloseSummary x #

to :: Rep ChannelCloseSummary x -> ChannelCloseSummary #

Generic ChannelCloseSummary'ClosureType 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep ChannelCloseSummary'ClosureType :: Type -> Type #

Methods

from :: ChannelCloseSummary'ClosureType -> Rep ChannelCloseSummary'ClosureType x #

to :: Rep ChannelCloseSummary'ClosureType x -> ChannelCloseSummary'ClosureType #

Generic ChannelCloseSummary'ClosureType'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep ChannelCloseSummary'ClosureType'UnrecognizedValue :: Type -> Type #

Methods

from :: ChannelCloseSummary'ClosureType'UnrecognizedValue -> Rep ChannelCloseSummary'ClosureType'UnrecognizedValue x #

to :: Rep ChannelCloseSummary'ClosureType'UnrecognizedValue x -> ChannelCloseSummary'ClosureType'UnrecognizedValue #

Generic ChannelConstraints 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep ChannelConstraints :: Type -> Type #

Methods

from :: ChannelConstraints -> Rep ChannelConstraints x #

to :: Rep ChannelConstraints x -> ChannelConstraints #

Generic ChannelEdge 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep ChannelEdge :: Type -> Type #

Methods

from :: ChannelEdge -> Rep ChannelEdge x #

to :: Rep ChannelEdge x -> ChannelEdge #

Generic ChannelEdgeUpdate 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep ChannelEdgeUpdate :: Type -> Type #

Methods

from :: ChannelEdgeUpdate -> Rep ChannelEdgeUpdate x #

to :: Rep ChannelEdgeUpdate x -> ChannelEdgeUpdate #

Generic ChannelEventSubscription 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep ChannelEventSubscription :: Type -> Type #

Methods

from :: ChannelEventSubscription -> Rep ChannelEventSubscription x #

to :: Rep ChannelEventSubscription x -> ChannelEventSubscription #

Generic ChannelEventUpdate 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep ChannelEventUpdate :: Type -> Type #

Methods

from :: ChannelEventUpdate -> Rep ChannelEventUpdate x #

to :: Rep ChannelEventUpdate x -> ChannelEventUpdate #

Generic ChannelEventUpdate'Channel 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep ChannelEventUpdate'Channel :: Type -> Type #

Methods

from :: ChannelEventUpdate'Channel -> Rep ChannelEventUpdate'Channel x #

to :: Rep ChannelEventUpdate'Channel x -> ChannelEventUpdate'Channel #

Generic ChannelEventUpdate'UpdateType 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep ChannelEventUpdate'UpdateType :: Type -> Type #

Methods

from :: ChannelEventUpdate'UpdateType -> Rep ChannelEventUpdate'UpdateType x #

to :: Rep ChannelEventUpdate'UpdateType x -> ChannelEventUpdate'UpdateType #

Generic ChannelEventUpdate'UpdateType'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep ChannelEventUpdate'UpdateType'UnrecognizedValue :: Type -> Type #

Methods

from :: ChannelEventUpdate'UpdateType'UnrecognizedValue -> Rep ChannelEventUpdate'UpdateType'UnrecognizedValue x #

to :: Rep ChannelEventUpdate'UpdateType'UnrecognizedValue x -> ChannelEventUpdate'UpdateType'UnrecognizedValue #

Generic ChannelGraph 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep ChannelGraph :: Type -> Type #

Methods

from :: ChannelGraph -> Rep ChannelGraph x #

to :: Rep ChannelGraph x -> ChannelGraph #

Generic ChannelGraphRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep ChannelGraphRequest :: Type -> Type #

Methods

from :: ChannelGraphRequest -> Rep ChannelGraphRequest x #

to :: Rep ChannelGraphRequest x -> ChannelGraphRequest #

Generic ChannelPoint 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep ChannelPoint :: Type -> Type #

Methods

from :: ChannelPoint -> Rep ChannelPoint x #

to :: Rep ChannelPoint x -> ChannelPoint #

Generic ChannelPoint'FundingTxid 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep ChannelPoint'FundingTxid :: Type -> Type #

Methods

from :: ChannelPoint'FundingTxid -> Rep ChannelPoint'FundingTxid x #

to :: Rep ChannelPoint'FundingTxid x -> ChannelPoint'FundingTxid #

Generic ClosedChannelUpdate 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep ClosedChannelUpdate :: Type -> Type #

Methods

from :: ClosedChannelUpdate -> Rep ClosedChannelUpdate x #

to :: Rep ClosedChannelUpdate x -> ClosedChannelUpdate #

Generic CommitmentType 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep CommitmentType :: Type -> Type #

Methods

from :: CommitmentType -> Rep CommitmentType x #

to :: Rep CommitmentType x -> CommitmentType #

Generic CommitmentType'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep CommitmentType'UnrecognizedValue :: Type -> Type #

Methods

from :: CommitmentType'UnrecognizedValue -> Rep CommitmentType'UnrecognizedValue x #

to :: Rep CommitmentType'UnrecognizedValue x -> CommitmentType'UnrecognizedValue #

Generic EdgeLocator 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep EdgeLocator :: Type -> Type #

Methods

from :: EdgeLocator -> Rep EdgeLocator x #

to :: Rep EdgeLocator x -> EdgeLocator #

Generic Feature 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep Feature :: Type -> Type #

Methods

from :: Feature -> Rep Feature x #

to :: Rep Feature x -> Feature #

Generic FeatureBit 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep FeatureBit :: Type -> Type #

Methods

from :: FeatureBit -> Rep FeatureBit x #

to :: Rep FeatureBit x -> FeatureBit #

Generic FeatureBit'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep FeatureBit'UnrecognizedValue :: Type -> Type #

Methods

from :: FeatureBit'UnrecognizedValue -> Rep FeatureBit'UnrecognizedValue x #

to :: Rep FeatureBit'UnrecognizedValue x -> FeatureBit'UnrecognizedValue #

Generic FeeLimit 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep FeeLimit :: Type -> Type #

Methods

from :: FeeLimit -> Rep FeeLimit x #

to :: Rep FeeLimit x -> FeeLimit #

Generic FeeLimit'Limit 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep FeeLimit'Limit :: Type -> Type #

Methods

from :: FeeLimit'Limit -> Rep FeeLimit'Limit x #

to :: Rep FeeLimit'Limit x -> FeeLimit'Limit #

Generic FloatMetric 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep FloatMetric :: Type -> Type #

Methods

from :: FloatMetric -> Rep FloatMetric x #

to :: Rep FloatMetric x -> FloatMetric #

Generic FundingPsbtFinalize 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep FundingPsbtFinalize :: Type -> Type #

Methods

from :: FundingPsbtFinalize -> Rep FundingPsbtFinalize x #

to :: Rep FundingPsbtFinalize x -> FundingPsbtFinalize #

Generic FundingPsbtVerify 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep FundingPsbtVerify :: Type -> Type #

Methods

from :: FundingPsbtVerify -> Rep FundingPsbtVerify x #

to :: Rep FundingPsbtVerify x -> FundingPsbtVerify #

Generic FundingShim 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep FundingShim :: Type -> Type #

Methods

from :: FundingShim -> Rep FundingShim x #

to :: Rep FundingShim x -> FundingShim #

Generic FundingShim'Shim 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep FundingShim'Shim :: Type -> Type #

Methods

from :: FundingShim'Shim -> Rep FundingShim'Shim x #

to :: Rep FundingShim'Shim x -> FundingShim'Shim #

Generic FundingShimCancel 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep FundingShimCancel :: Type -> Type #

Methods

from :: FundingShimCancel -> Rep FundingShimCancel x #

to :: Rep FundingShimCancel x -> FundingShimCancel #

Generic FundingStateStepResp 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep FundingStateStepResp :: Type -> Type #

Methods

from :: FundingStateStepResp -> Rep FundingStateStepResp x #

to :: Rep FundingStateStepResp x -> FundingStateStepResp #

Generic FundingTransitionMsg 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep FundingTransitionMsg :: Type -> Type #

Methods

from :: FundingTransitionMsg -> Rep FundingTransitionMsg x #

to :: Rep FundingTransitionMsg x -> FundingTransitionMsg #

Generic FundingTransitionMsg'Trigger 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep FundingTransitionMsg'Trigger :: Type -> Type #

Methods

from :: FundingTransitionMsg'Trigger -> Rep FundingTransitionMsg'Trigger x #

to :: Rep FundingTransitionMsg'Trigger x -> FundingTransitionMsg'Trigger #

Generic GraphTopologySubscription 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep GraphTopologySubscription :: Type -> Type #

Methods

from :: GraphTopologySubscription -> Rep GraphTopologySubscription x #

to :: Rep GraphTopologySubscription x -> GraphTopologySubscription #

Generic GraphTopologyUpdate 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep GraphTopologyUpdate :: Type -> Type #

Methods

from :: GraphTopologyUpdate -> Rep GraphTopologyUpdate x #

to :: Rep GraphTopologyUpdate x -> GraphTopologyUpdate #

Generic HTLC 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep HTLC :: Type -> Type #

Methods

from :: HTLC -> Rep HTLC x #

to :: Rep HTLC x -> HTLC #

Generic Hop 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep Hop :: Type -> Type #

Methods

from :: Hop -> Rep Hop x #

to :: Rep Hop x -> Hop #

Generic Hop'CustomRecordsEntry 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep Hop'CustomRecordsEntry :: Type -> Type #

Methods

from :: Hop'CustomRecordsEntry -> Rep Hop'CustomRecordsEntry x #

to :: Rep Hop'CustomRecordsEntry x -> Hop'CustomRecordsEntry #

Generic HopHint 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep HopHint :: Type -> Type #

Methods

from :: HopHint -> Rep HopHint x #

to :: Rep HopHint x -> HopHint #

Generic Initiator 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep Initiator :: Type -> Type #

Methods

from :: Initiator -> Rep Initiator x #

to :: Rep Initiator x -> Initiator #

Generic Initiator'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep Initiator'UnrecognizedValue :: Type -> Type #

Methods

from :: Initiator'UnrecognizedValue -> Rep Initiator'UnrecognizedValue x #

to :: Rep Initiator'UnrecognizedValue x -> Initiator'UnrecognizedValue #

Generic KeyDescriptor 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep KeyDescriptor :: Type -> Type #

Methods

from :: KeyDescriptor -> Rep KeyDescriptor x #

to :: Rep KeyDescriptor x -> KeyDescriptor #

Generic KeyLocator 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep KeyLocator :: Type -> Type #

Methods

from :: KeyLocator -> Rep KeyLocator x #

to :: Rep KeyLocator x -> KeyLocator #

Generic LightningNode 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep LightningNode :: Type -> Type #

Methods

from :: LightningNode -> Rep LightningNode x #

to :: Rep LightningNode x -> LightningNode #

Generic LightningNode'FeaturesEntry 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep LightningNode'FeaturesEntry :: Type -> Type #

Methods

from :: LightningNode'FeaturesEntry -> Rep LightningNode'FeaturesEntry x #

to :: Rep LightningNode'FeaturesEntry x -> LightningNode'FeaturesEntry #

Generic MPPRecord 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep MPPRecord :: Type -> Type #

Methods

from :: MPPRecord -> Rep MPPRecord x #

to :: Rep MPPRecord x -> MPPRecord #

Generic NetworkInfo 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep NetworkInfo :: Type -> Type #

Methods

from :: NetworkInfo -> Rep NetworkInfo x #

to :: Rep NetworkInfo x -> NetworkInfo #

Generic NetworkInfoRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep NetworkInfoRequest :: Type -> Type #

Methods

from :: NetworkInfoRequest -> Rep NetworkInfoRequest x #

to :: Rep NetworkInfoRequest x -> NetworkInfoRequest #

Generic NodeAddress 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep NodeAddress :: Type -> Type #

Methods

from :: NodeAddress -> Rep NodeAddress x #

to :: Rep NodeAddress x -> NodeAddress #

Generic NodeInfo 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep NodeInfo :: Type -> Type #

Methods

from :: NodeInfo -> Rep NodeInfo x #

to :: Rep NodeInfo x -> NodeInfo #

Generic NodeInfoRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep NodeInfoRequest :: Type -> Type #

Methods

from :: NodeInfoRequest -> Rep NodeInfoRequest x #

to :: Rep NodeInfoRequest x -> NodeInfoRequest #

Generic NodeMetricType 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep NodeMetricType :: Type -> Type #

Methods

from :: NodeMetricType -> Rep NodeMetricType x #

to :: Rep NodeMetricType x -> NodeMetricType #

Generic NodeMetricType'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep NodeMetricType'UnrecognizedValue :: Type -> Type #

Methods

from :: NodeMetricType'UnrecognizedValue -> Rep NodeMetricType'UnrecognizedValue x #

to :: Rep NodeMetricType'UnrecognizedValue x -> NodeMetricType'UnrecognizedValue #

Generic NodeMetricsRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep NodeMetricsRequest :: Type -> Type #

Methods

from :: NodeMetricsRequest -> Rep NodeMetricsRequest x #

to :: Rep NodeMetricsRequest x -> NodeMetricsRequest #

Generic NodeMetricsResponse 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep NodeMetricsResponse :: Type -> Type #

Methods

from :: NodeMetricsResponse -> Rep NodeMetricsResponse x #

to :: Rep NodeMetricsResponse x -> NodeMetricsResponse #

Generic NodeMetricsResponse'BetweennessCentralityEntry 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep NodeMetricsResponse'BetweennessCentralityEntry :: Type -> Type #

Methods

from :: NodeMetricsResponse'BetweennessCentralityEntry -> Rep NodeMetricsResponse'BetweennessCentralityEntry x #

to :: Rep NodeMetricsResponse'BetweennessCentralityEntry x -> NodeMetricsResponse'BetweennessCentralityEntry #

Generic NodePair 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep NodePair :: Type -> Type #

Methods

from :: NodePair -> Rep NodePair x #

to :: Rep NodePair x -> NodePair #

Generic NodeUpdate 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep NodeUpdate :: Type -> Type #

Methods

from :: NodeUpdate -> Rep NodeUpdate x #

to :: Rep NodeUpdate x -> NodeUpdate #

Generic NodeUpdate'FeaturesEntry 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep NodeUpdate'FeaturesEntry :: Type -> Type #

Methods

from :: NodeUpdate'FeaturesEntry -> Rep NodeUpdate'FeaturesEntry x #

to :: Rep NodeUpdate'FeaturesEntry x -> NodeUpdate'FeaturesEntry #

Generic OutPoint 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep OutPoint :: Type -> Type #

Methods

from :: OutPoint -> Rep OutPoint x #

to :: Rep OutPoint x -> OutPoint #

Generic PendingChannelsRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep PendingChannelsRequest :: Type -> Type #

Methods

from :: PendingChannelsRequest -> Rep PendingChannelsRequest x #

to :: Rep PendingChannelsRequest x -> PendingChannelsRequest #

Generic PendingChannelsResponse 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep PendingChannelsResponse :: Type -> Type #

Methods

from :: PendingChannelsResponse -> Rep PendingChannelsResponse x #

to :: Rep PendingChannelsResponse x -> PendingChannelsResponse #

Generic PendingChannelsResponse'ClosedChannel 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep PendingChannelsResponse'ClosedChannel :: Type -> Type #

Methods

from :: PendingChannelsResponse'ClosedChannel -> Rep PendingChannelsResponse'ClosedChannel x #

to :: Rep PendingChannelsResponse'ClosedChannel x -> PendingChannelsResponse'ClosedChannel #

Generic PendingChannelsResponse'Commitments 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep PendingChannelsResponse'Commitments :: Type -> Type #

Methods

from :: PendingChannelsResponse'Commitments -> Rep PendingChannelsResponse'Commitments x #

to :: Rep PendingChannelsResponse'Commitments x -> PendingChannelsResponse'Commitments #

Generic PendingChannelsResponse'ForceClosedChannel 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep PendingChannelsResponse'ForceClosedChannel :: Type -> Type #

Methods

from :: PendingChannelsResponse'ForceClosedChannel -> Rep PendingChannelsResponse'ForceClosedChannel x #

to :: Rep PendingChannelsResponse'ForceClosedChannel x -> PendingChannelsResponse'ForceClosedChannel #

Generic PendingChannelsResponse'ForceClosedChannel'AnchorState 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep PendingChannelsResponse'ForceClosedChannel'AnchorState :: Type -> Type #

Methods

from :: PendingChannelsResponse'ForceClosedChannel'AnchorState -> Rep PendingChannelsResponse'ForceClosedChannel'AnchorState x #

to :: Rep PendingChannelsResponse'ForceClosedChannel'AnchorState x -> PendingChannelsResponse'ForceClosedChannel'AnchorState #

Generic PendingChannelsResponse'ForceClosedChannel'AnchorState'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep PendingChannelsResponse'ForceClosedChannel'AnchorState'UnrecognizedValue :: Type -> Type #

Methods

from :: PendingChannelsResponse'ForceClosedChannel'AnchorState'UnrecognizedValue -> Rep PendingChannelsResponse'ForceClosedChannel'AnchorState'UnrecognizedValue x #

to :: Rep PendingChannelsResponse'ForceClosedChannel'AnchorState'UnrecognizedValue x -> PendingChannelsResponse'ForceClosedChannel'AnchorState'UnrecognizedValue #

Generic PendingChannelsResponse'PendingChannel 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep PendingChannelsResponse'PendingChannel :: Type -> Type #

Methods

from :: PendingChannelsResponse'PendingChannel -> Rep PendingChannelsResponse'PendingChannel x #

to :: Rep PendingChannelsResponse'PendingChannel x -> PendingChannelsResponse'PendingChannel #

Generic PendingChannelsResponse'PendingOpenChannel 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep PendingChannelsResponse'PendingOpenChannel :: Type -> Type #

Methods

from :: PendingChannelsResponse'PendingOpenChannel -> Rep PendingChannelsResponse'PendingOpenChannel x #

to :: Rep PendingChannelsResponse'PendingOpenChannel x -> PendingChannelsResponse'PendingOpenChannel #

Generic PendingChannelsResponse'WaitingCloseChannel 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep PendingChannelsResponse'WaitingCloseChannel :: Type -> Type #

Methods

from :: PendingChannelsResponse'WaitingCloseChannel -> Rep PendingChannelsResponse'WaitingCloseChannel x #

to :: Rep PendingChannelsResponse'WaitingCloseChannel x -> PendingChannelsResponse'WaitingCloseChannel #

Generic PendingHTLC 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep PendingHTLC :: Type -> Type #

Methods

from :: PendingHTLC -> Rep PendingHTLC x #

to :: Rep PendingHTLC x -> PendingHTLC #

Generic PendingUpdate 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep PendingUpdate :: Type -> Type #

Methods

from :: PendingUpdate -> Rep PendingUpdate x #

to :: Rep PendingUpdate x -> PendingUpdate #

Generic PsbtShim 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep PsbtShim :: Type -> Type #

Methods

from :: PsbtShim -> Rep PsbtShim x #

to :: Rep PsbtShim x -> PsbtShim #

Generic QueryRoutesRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep QueryRoutesRequest :: Type -> Type #

Methods

from :: QueryRoutesRequest -> Rep QueryRoutesRequest x #

to :: Rep QueryRoutesRequest x -> QueryRoutesRequest #

Generic QueryRoutesRequest'DestCustomRecordsEntry 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep QueryRoutesRequest'DestCustomRecordsEntry :: Type -> Type #

Methods

from :: QueryRoutesRequest'DestCustomRecordsEntry -> Rep QueryRoutesRequest'DestCustomRecordsEntry x #

to :: Rep QueryRoutesRequest'DestCustomRecordsEntry x -> QueryRoutesRequest'DestCustomRecordsEntry #

Generic QueryRoutesResponse 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep QueryRoutesResponse :: Type -> Type #

Methods

from :: QueryRoutesResponse -> Rep QueryRoutesResponse x #

to :: Rep QueryRoutesResponse x -> QueryRoutesResponse #

Generic Resolution 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep Resolution :: Type -> Type #

Methods

from :: Resolution -> Rep Resolution x #

to :: Rep Resolution x -> Resolution #

Generic ResolutionOutcome 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep ResolutionOutcome :: Type -> Type #

Methods

from :: ResolutionOutcome -> Rep ResolutionOutcome x #

to :: Rep ResolutionOutcome x -> ResolutionOutcome #

Generic ResolutionOutcome'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep ResolutionOutcome'UnrecognizedValue :: Type -> Type #

Methods

from :: ResolutionOutcome'UnrecognizedValue -> Rep ResolutionOutcome'UnrecognizedValue x #

to :: Rep ResolutionOutcome'UnrecognizedValue x -> ResolutionOutcome'UnrecognizedValue #

Generic ResolutionType 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep ResolutionType :: Type -> Type #

Methods

from :: ResolutionType -> Rep ResolutionType x #

to :: Rep ResolutionType x -> ResolutionType #

Generic ResolutionType'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep ResolutionType'UnrecognizedValue :: Type -> Type #

Methods

from :: ResolutionType'UnrecognizedValue -> Rep ResolutionType'UnrecognizedValue x #

to :: Rep ResolutionType'UnrecognizedValue x -> ResolutionType'UnrecognizedValue #

Generic Route 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep Route :: Type -> Type #

Methods

from :: Route -> Rep Route x #

to :: Rep Route x -> Route #

Generic RouteHint 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep RouteHint :: Type -> Type #

Methods

from :: RouteHint -> Rep RouteHint x #

to :: Rep RouteHint x -> RouteHint #

Generic RoutingPolicy 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep RoutingPolicy :: Type -> Type #

Methods

from :: RoutingPolicy -> Rep RoutingPolicy x #

to :: Rep RoutingPolicy x -> RoutingPolicy #

Generic StopRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep StopRequest :: Type -> Type #

Methods

from :: StopRequest -> Rep StopRequest x #

to :: Rep StopRequest x -> StopRequest #

Generic StopResponse 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep StopResponse :: Type -> Type #

Methods

from :: StopResponse -> Rep StopResponse x #

to :: Rep StopResponse x -> StopResponse #

Generic WalletAccountBalance 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep WalletAccountBalance :: Type -> Type #

Methods

from :: WalletAccountBalance -> Rep WalletAccountBalance x #

to :: Rep WalletAccountBalance x -> WalletAccountBalance #

Generic WalletBalanceRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep WalletBalanceRequest :: Type -> Type #

Methods

from :: WalletBalanceRequest -> Rep WalletBalanceRequest x #

to :: Rep WalletBalanceRequest x -> WalletBalanceRequest #

Generic WalletBalanceResponse 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep WalletBalanceResponse :: Type -> Type #

Methods

from :: WalletBalanceResponse -> Rep WalletBalanceResponse x #

to :: Rep WalletBalanceResponse x -> WalletBalanceResponse #

Generic WalletBalanceResponse'AccountBalanceEntry 
Instance details

Defined in Proto.Lnrpc.Ln0

Associated Types

type Rep WalletBalanceResponse'AccountBalanceEntry :: Type -> Type #

Methods

from :: WalletBalanceResponse'AccountBalanceEntry -> Rep WalletBalanceResponse'AccountBalanceEntry x #

to :: Rep WalletBalanceResponse'AccountBalanceEntry x -> WalletBalanceResponse'AccountBalanceEntry #

Generic AMP 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep AMP :: Type -> Type #

Methods

from :: AMP -> Rep AMP x #

to :: Rep AMP x -> AMP #

Generic AMPInvoiceState 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep AMPInvoiceState :: Type -> Type #

Methods

from :: AMPInvoiceState -> Rep AMPInvoiceState x #

to :: Rep AMPInvoiceState x -> AMPInvoiceState #

Generic AbandonChannelRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep AbandonChannelRequest :: Type -> Type #

Methods

from :: AbandonChannelRequest -> Rep AbandonChannelRequest x #

to :: Rep AbandonChannelRequest x -> AbandonChannelRequest #

Generic AbandonChannelResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep AbandonChannelResponse :: Type -> Type #

Methods

from :: AbandonChannelResponse -> Rep AbandonChannelResponse x #

to :: Rep AbandonChannelResponse x -> AbandonChannelResponse #

Generic AddInvoiceResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep AddInvoiceResponse :: Type -> Type #

Methods

from :: AddInvoiceResponse -> Rep AddInvoiceResponse x #

to :: Rep AddInvoiceResponse x -> AddInvoiceResponse #

Generic BakeMacaroonRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep BakeMacaroonRequest :: Type -> Type #

Methods

from :: BakeMacaroonRequest -> Rep BakeMacaroonRequest x #

to :: Rep BakeMacaroonRequest x -> BakeMacaroonRequest #

Generic BakeMacaroonResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep BakeMacaroonResponse :: Type -> Type #

Methods

from :: BakeMacaroonResponse -> Rep BakeMacaroonResponse x #

to :: Rep BakeMacaroonResponse x -> BakeMacaroonResponse #

Generic ChanBackupExportRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep ChanBackupExportRequest :: Type -> Type #

Methods

from :: ChanBackupExportRequest -> Rep ChanBackupExportRequest x #

to :: Rep ChanBackupExportRequest x -> ChanBackupExportRequest #

Generic ChanBackupSnapshot 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep ChanBackupSnapshot :: Type -> Type #

Methods

from :: ChanBackupSnapshot -> Rep ChanBackupSnapshot x #

to :: Rep ChanBackupSnapshot x -> ChanBackupSnapshot #

Generic ChannelBackup 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep ChannelBackup :: Type -> Type #

Methods

from :: ChannelBackup -> Rep ChannelBackup x #

to :: Rep ChannelBackup x -> ChannelBackup #

Generic ChannelBackupSubscription 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep ChannelBackupSubscription :: Type -> Type #

Methods

from :: ChannelBackupSubscription -> Rep ChannelBackupSubscription x #

to :: Rep ChannelBackupSubscription x -> ChannelBackupSubscription #

Generic ChannelBackups 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep ChannelBackups :: Type -> Type #

Methods

from :: ChannelBackups -> Rep ChannelBackups x #

to :: Rep ChannelBackups x -> ChannelBackups #

Generic ChannelFeeReport 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep ChannelFeeReport :: Type -> Type #

Methods

from :: ChannelFeeReport -> Rep ChannelFeeReport x #

to :: Rep ChannelFeeReport x -> ChannelFeeReport #

Generic ChannelUpdate 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep ChannelUpdate :: Type -> Type #

Methods

from :: ChannelUpdate -> Rep ChannelUpdate x #

to :: Rep ChannelUpdate x -> ChannelUpdate #

Generic CheckMacPermRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep CheckMacPermRequest :: Type -> Type #

Methods

from :: CheckMacPermRequest -> Rep CheckMacPermRequest x #

to :: Rep CheckMacPermRequest x -> CheckMacPermRequest #

Generic CheckMacPermResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep CheckMacPermResponse :: Type -> Type #

Methods

from :: CheckMacPermResponse -> Rep CheckMacPermResponse x #

to :: Rep CheckMacPermResponse x -> CheckMacPermResponse #

Generic DebugLevelRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep DebugLevelRequest :: Type -> Type #

Methods

from :: DebugLevelRequest -> Rep DebugLevelRequest x #

to :: Rep DebugLevelRequest x -> DebugLevelRequest #

Generic DebugLevelResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep DebugLevelResponse :: Type -> Type #

Methods

from :: DebugLevelResponse -> Rep DebugLevelResponse x #

to :: Rep DebugLevelResponse x -> DebugLevelResponse #

Generic DeleteAllPaymentsRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep DeleteAllPaymentsRequest :: Type -> Type #

Methods

from :: DeleteAllPaymentsRequest -> Rep DeleteAllPaymentsRequest x #

to :: Rep DeleteAllPaymentsRequest x -> DeleteAllPaymentsRequest #

Generic DeleteAllPaymentsResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep DeleteAllPaymentsResponse :: Type -> Type #

Methods

from :: DeleteAllPaymentsResponse -> Rep DeleteAllPaymentsResponse x #

to :: Rep DeleteAllPaymentsResponse x -> DeleteAllPaymentsResponse #

Generic DeleteMacaroonIDRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep DeleteMacaroonIDRequest :: Type -> Type #

Methods

from :: DeleteMacaroonIDRequest -> Rep DeleteMacaroonIDRequest x #

to :: Rep DeleteMacaroonIDRequest x -> DeleteMacaroonIDRequest #

Generic DeleteMacaroonIDResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep DeleteMacaroonIDResponse :: Type -> Type #

Methods

from :: DeleteMacaroonIDResponse -> Rep DeleteMacaroonIDResponse x #

to :: Rep DeleteMacaroonIDResponse x -> DeleteMacaroonIDResponse #

Generic DeletePaymentRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep DeletePaymentRequest :: Type -> Type #

Methods

from :: DeletePaymentRequest -> Rep DeletePaymentRequest x #

to :: Rep DeletePaymentRequest x -> DeletePaymentRequest #

Generic DeletePaymentResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep DeletePaymentResponse :: Type -> Type #

Methods

from :: DeletePaymentResponse -> Rep DeletePaymentResponse x #

to :: Rep DeletePaymentResponse x -> DeletePaymentResponse #

Generic ExportChannelBackupRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep ExportChannelBackupRequest :: Type -> Type #

Methods

from :: ExportChannelBackupRequest -> Rep ExportChannelBackupRequest x #

to :: Rep ExportChannelBackupRequest x -> ExportChannelBackupRequest #

Generic FailedUpdate 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep FailedUpdate :: Type -> Type #

Methods

from :: FailedUpdate -> Rep FailedUpdate x #

to :: Rep FailedUpdate x -> FailedUpdate #

Generic Failure 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep Failure :: Type -> Type #

Methods

from :: Failure -> Rep Failure x #

to :: Rep Failure x -> Failure #

Generic Failure'FailureCode 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep Failure'FailureCode :: Type -> Type #

Methods

from :: Failure'FailureCode -> Rep Failure'FailureCode x #

to :: Rep Failure'FailureCode x -> Failure'FailureCode #

Generic Failure'FailureCode'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep Failure'FailureCode'UnrecognizedValue :: Type -> Type #

Methods

from :: Failure'FailureCode'UnrecognizedValue -> Rep Failure'FailureCode'UnrecognizedValue x #

to :: Rep Failure'FailureCode'UnrecognizedValue x -> Failure'FailureCode'UnrecognizedValue #

Generic FeeReportRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep FeeReportRequest :: Type -> Type #

Methods

from :: FeeReportRequest -> Rep FeeReportRequest x #

to :: Rep FeeReportRequest x -> FeeReportRequest #

Generic FeeReportResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep FeeReportResponse :: Type -> Type #

Methods

from :: FeeReportResponse -> Rep FeeReportResponse x #

to :: Rep FeeReportResponse x -> FeeReportResponse #

Generic ForwardingEvent 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep ForwardingEvent :: Type -> Type #

Methods

from :: ForwardingEvent -> Rep ForwardingEvent x #

to :: Rep ForwardingEvent x -> ForwardingEvent #

Generic ForwardingHistoryRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep ForwardingHistoryRequest :: Type -> Type #

Methods

from :: ForwardingHistoryRequest -> Rep ForwardingHistoryRequest x #

to :: Rep ForwardingHistoryRequest x -> ForwardingHistoryRequest #

Generic ForwardingHistoryResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep ForwardingHistoryResponse :: Type -> Type #

Methods

from :: ForwardingHistoryResponse -> Rep ForwardingHistoryResponse x #

to :: Rep ForwardingHistoryResponse x -> ForwardingHistoryResponse #

Generic HTLCAttempt 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep HTLCAttempt :: Type -> Type #

Methods

from :: HTLCAttempt -> Rep HTLCAttempt x #

to :: Rep HTLCAttempt x -> HTLCAttempt #

Generic HTLCAttempt'HTLCStatus 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep HTLCAttempt'HTLCStatus :: Type -> Type #

Methods

from :: HTLCAttempt'HTLCStatus -> Rep HTLCAttempt'HTLCStatus x #

to :: Rep HTLCAttempt'HTLCStatus x -> HTLCAttempt'HTLCStatus #

Generic HTLCAttempt'HTLCStatus'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep HTLCAttempt'HTLCStatus'UnrecognizedValue :: Type -> Type #

Methods

from :: HTLCAttempt'HTLCStatus'UnrecognizedValue -> Rep HTLCAttempt'HTLCStatus'UnrecognizedValue x #

to :: Rep HTLCAttempt'HTLCStatus'UnrecognizedValue x -> HTLCAttempt'HTLCStatus'UnrecognizedValue #

Generic InterceptFeedback 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep InterceptFeedback :: Type -> Type #

Methods

from :: InterceptFeedback -> Rep InterceptFeedback x #

to :: Rep InterceptFeedback x -> InterceptFeedback #

Generic Invoice 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep Invoice :: Type -> Type #

Methods

from :: Invoice -> Rep Invoice x #

to :: Rep Invoice x -> Invoice #

Generic Invoice'AmpInvoiceStateEntry 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep Invoice'AmpInvoiceStateEntry :: Type -> Type #

Methods

from :: Invoice'AmpInvoiceStateEntry -> Rep Invoice'AmpInvoiceStateEntry x #

to :: Rep Invoice'AmpInvoiceStateEntry x -> Invoice'AmpInvoiceStateEntry #

Generic Invoice'FeaturesEntry 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep Invoice'FeaturesEntry :: Type -> Type #

Methods

from :: Invoice'FeaturesEntry -> Rep Invoice'FeaturesEntry x #

to :: Rep Invoice'FeaturesEntry x -> Invoice'FeaturesEntry #

Generic Invoice'InvoiceState 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep Invoice'InvoiceState :: Type -> Type #

Methods

from :: Invoice'InvoiceState -> Rep Invoice'InvoiceState x #

to :: Rep Invoice'InvoiceState x -> Invoice'InvoiceState #

Generic Invoice'InvoiceState'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep Invoice'InvoiceState'UnrecognizedValue :: Type -> Type #

Methods

from :: Invoice'InvoiceState'UnrecognizedValue -> Rep Invoice'InvoiceState'UnrecognizedValue x #

to :: Rep Invoice'InvoiceState'UnrecognizedValue x -> Invoice'InvoiceState'UnrecognizedValue #

Generic InvoiceHTLC 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep InvoiceHTLC :: Type -> Type #

Methods

from :: InvoiceHTLC -> Rep InvoiceHTLC x #

to :: Rep InvoiceHTLC x -> InvoiceHTLC #

Generic InvoiceHTLC'CustomRecordsEntry 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep InvoiceHTLC'CustomRecordsEntry :: Type -> Type #

Methods

from :: InvoiceHTLC'CustomRecordsEntry -> Rep InvoiceHTLC'CustomRecordsEntry x #

to :: Rep InvoiceHTLC'CustomRecordsEntry x -> InvoiceHTLC'CustomRecordsEntry #

Generic InvoiceHTLCState 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep InvoiceHTLCState :: Type -> Type #

Methods

from :: InvoiceHTLCState -> Rep InvoiceHTLCState x #

to :: Rep InvoiceHTLCState x -> InvoiceHTLCState #

Generic InvoiceHTLCState'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep InvoiceHTLCState'UnrecognizedValue :: Type -> Type #

Methods

from :: InvoiceHTLCState'UnrecognizedValue -> Rep InvoiceHTLCState'UnrecognizedValue x #

to :: Rep InvoiceHTLCState'UnrecognizedValue x -> InvoiceHTLCState'UnrecognizedValue #

Generic InvoiceSubscription 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep InvoiceSubscription :: Type -> Type #

Methods

from :: InvoiceSubscription -> Rep InvoiceSubscription x #

to :: Rep InvoiceSubscription x -> InvoiceSubscription #

Generic ListInvoiceRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep ListInvoiceRequest :: Type -> Type #

Methods

from :: ListInvoiceRequest -> Rep ListInvoiceRequest x #

to :: Rep ListInvoiceRequest x -> ListInvoiceRequest #

Generic ListInvoiceResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep ListInvoiceResponse :: Type -> Type #

Methods

from :: ListInvoiceResponse -> Rep ListInvoiceResponse x #

to :: Rep ListInvoiceResponse x -> ListInvoiceResponse #

Generic ListMacaroonIDsRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep ListMacaroonIDsRequest :: Type -> Type #

Methods

from :: ListMacaroonIDsRequest -> Rep ListMacaroonIDsRequest x #

to :: Rep ListMacaroonIDsRequest x -> ListMacaroonIDsRequest #

Generic ListMacaroonIDsResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep ListMacaroonIDsResponse :: Type -> Type #

Methods

from :: ListMacaroonIDsResponse -> Rep ListMacaroonIDsResponse x #

to :: Rep ListMacaroonIDsResponse x -> ListMacaroonIDsResponse #

Generic ListPaymentsRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep ListPaymentsRequest :: Type -> Type #

Methods

from :: ListPaymentsRequest -> Rep ListPaymentsRequest x #

to :: Rep ListPaymentsRequest x -> ListPaymentsRequest #

Generic ListPaymentsResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep ListPaymentsResponse :: Type -> Type #

Methods

from :: ListPaymentsResponse -> Rep ListPaymentsResponse x #

to :: Rep ListPaymentsResponse x -> ListPaymentsResponse #

Generic ListPermissionsRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep ListPermissionsRequest :: Type -> Type #

Methods

from :: ListPermissionsRequest -> Rep ListPermissionsRequest x #

to :: Rep ListPermissionsRequest x -> ListPermissionsRequest #

Generic ListPermissionsResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep ListPermissionsResponse :: Type -> Type #

Methods

from :: ListPermissionsResponse -> Rep ListPermissionsResponse x #

to :: Rep ListPermissionsResponse x -> ListPermissionsResponse #

Generic ListPermissionsResponse'MethodPermissionsEntry 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep ListPermissionsResponse'MethodPermissionsEntry :: Type -> Type #

Methods

from :: ListPermissionsResponse'MethodPermissionsEntry -> Rep ListPermissionsResponse'MethodPermissionsEntry x #

to :: Rep ListPermissionsResponse'MethodPermissionsEntry x -> ListPermissionsResponse'MethodPermissionsEntry #

Generic MacaroonId 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep MacaroonId :: Type -> Type #

Methods

from :: MacaroonId -> Rep MacaroonId x #

to :: Rep MacaroonId x -> MacaroonId #

Generic MacaroonPermission 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep MacaroonPermission :: Type -> Type #

Methods

from :: MacaroonPermission -> Rep MacaroonPermission x #

to :: Rep MacaroonPermission x -> MacaroonPermission #

Generic MacaroonPermissionList 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep MacaroonPermissionList :: Type -> Type #

Methods

from :: MacaroonPermissionList -> Rep MacaroonPermissionList x #

to :: Rep MacaroonPermissionList x -> MacaroonPermissionList #

Generic MiddlewareRegistration 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep MiddlewareRegistration :: Type -> Type #

Methods

from :: MiddlewareRegistration -> Rep MiddlewareRegistration x #

to :: Rep MiddlewareRegistration x -> MiddlewareRegistration #

Generic MultiChanBackup 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep MultiChanBackup :: Type -> Type #

Methods

from :: MultiChanBackup -> Rep MultiChanBackup x #

to :: Rep MultiChanBackup x -> MultiChanBackup #

Generic Op 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep Op :: Type -> Type #

Methods

from :: Op -> Rep Op x #

to :: Rep Op x -> Op #

Generic PayReq 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep PayReq :: Type -> Type #

Methods

from :: PayReq -> Rep PayReq x #

to :: Rep PayReq x -> PayReq #

Generic PayReq'FeaturesEntry 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep PayReq'FeaturesEntry :: Type -> Type #

Methods

from :: PayReq'FeaturesEntry -> Rep PayReq'FeaturesEntry x #

to :: Rep PayReq'FeaturesEntry x -> PayReq'FeaturesEntry #

Generic PayReqString 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep PayReqString :: Type -> Type #

Methods

from :: PayReqString -> Rep PayReqString x #

to :: Rep PayReqString x -> PayReqString #

Generic Payment 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep Payment :: Type -> Type #

Methods

from :: Payment -> Rep Payment x #

to :: Rep Payment x -> Payment #

Generic Payment'PaymentStatus 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep Payment'PaymentStatus :: Type -> Type #

Methods

from :: Payment'PaymentStatus -> Rep Payment'PaymentStatus x #

to :: Rep Payment'PaymentStatus x -> Payment'PaymentStatus #

Generic Payment'PaymentStatus'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep Payment'PaymentStatus'UnrecognizedValue :: Type -> Type #

Methods

from :: Payment'PaymentStatus'UnrecognizedValue -> Rep Payment'PaymentStatus'UnrecognizedValue x #

to :: Rep Payment'PaymentStatus'UnrecognizedValue x -> Payment'PaymentStatus'UnrecognizedValue #

Generic PaymentFailureReason 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep PaymentFailureReason :: Type -> Type #

Methods

from :: PaymentFailureReason -> Rep PaymentFailureReason x #

to :: Rep PaymentFailureReason x -> PaymentFailureReason #

Generic PaymentFailureReason'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep PaymentFailureReason'UnrecognizedValue :: Type -> Type #

Methods

from :: PaymentFailureReason'UnrecognizedValue -> Rep PaymentFailureReason'UnrecognizedValue x #

to :: Rep PaymentFailureReason'UnrecognizedValue x -> PaymentFailureReason'UnrecognizedValue #

Generic PaymentHash 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep PaymentHash :: Type -> Type #

Methods

from :: PaymentHash -> Rep PaymentHash x #

to :: Rep PaymentHash x -> PaymentHash #

Generic PolicyUpdateRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep PolicyUpdateRequest :: Type -> Type #

Methods

from :: PolicyUpdateRequest -> Rep PolicyUpdateRequest x #

to :: Rep PolicyUpdateRequest x -> PolicyUpdateRequest #

Generic PolicyUpdateRequest'Scope 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep PolicyUpdateRequest'Scope :: Type -> Type #

Methods

from :: PolicyUpdateRequest'Scope -> Rep PolicyUpdateRequest'Scope x #

to :: Rep PolicyUpdateRequest'Scope x -> PolicyUpdateRequest'Scope #

Generic PolicyUpdateResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep PolicyUpdateResponse :: Type -> Type #

Methods

from :: PolicyUpdateResponse -> Rep PolicyUpdateResponse x #

to :: Rep PolicyUpdateResponse x -> PolicyUpdateResponse #

Generic RPCMessage 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep RPCMessage :: Type -> Type #

Methods

from :: RPCMessage -> Rep RPCMessage x #

to :: Rep RPCMessage x -> RPCMessage #

Generic RPCMiddlewareRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep RPCMiddlewareRequest :: Type -> Type #

Methods

from :: RPCMiddlewareRequest -> Rep RPCMiddlewareRequest x #

to :: Rep RPCMiddlewareRequest x -> RPCMiddlewareRequest #

Generic RPCMiddlewareRequest'InterceptType 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep RPCMiddlewareRequest'InterceptType :: Type -> Type #

Methods

from :: RPCMiddlewareRequest'InterceptType -> Rep RPCMiddlewareRequest'InterceptType x #

to :: Rep RPCMiddlewareRequest'InterceptType x -> RPCMiddlewareRequest'InterceptType #

Generic RPCMiddlewareResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep RPCMiddlewareResponse :: Type -> Type #

Methods

from :: RPCMiddlewareResponse -> Rep RPCMiddlewareResponse x #

to :: Rep RPCMiddlewareResponse x -> RPCMiddlewareResponse #

Generic RPCMiddlewareResponse'MiddlewareMessage 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep RPCMiddlewareResponse'MiddlewareMessage :: Type -> Type #

Methods

from :: RPCMiddlewareResponse'MiddlewareMessage -> Rep RPCMiddlewareResponse'MiddlewareMessage x #

to :: Rep RPCMiddlewareResponse'MiddlewareMessage x -> RPCMiddlewareResponse'MiddlewareMessage #

Generic RestoreBackupResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep RestoreBackupResponse :: Type -> Type #

Methods

from :: RestoreBackupResponse -> Rep RestoreBackupResponse x #

to :: Rep RestoreBackupResponse x -> RestoreBackupResponse #

Generic RestoreChanBackupRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep RestoreChanBackupRequest :: Type -> Type #

Methods

from :: RestoreChanBackupRequest -> Rep RestoreChanBackupRequest x #

to :: Rep RestoreChanBackupRequest x -> RestoreChanBackupRequest #

Generic RestoreChanBackupRequest'Backup 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep RestoreChanBackupRequest'Backup :: Type -> Type #

Methods

from :: RestoreChanBackupRequest'Backup -> Rep RestoreChanBackupRequest'Backup x #

to :: Rep RestoreChanBackupRequest'Backup x -> RestoreChanBackupRequest'Backup #

Generic SetID 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep SetID :: Type -> Type #

Methods

from :: SetID -> Rep SetID x #

to :: Rep SetID x -> SetID #

Generic StreamAuth 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep StreamAuth :: Type -> Type #

Methods

from :: StreamAuth -> Rep StreamAuth x #

to :: Rep StreamAuth x -> StreamAuth #

Generic UpdateFailure 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep UpdateFailure :: Type -> Type #

Methods

from :: UpdateFailure -> Rep UpdateFailure x #

to :: Rep UpdateFailure x -> UpdateFailure #

Generic UpdateFailure'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep UpdateFailure'UnrecognizedValue :: Type -> Type #

Methods

from :: UpdateFailure'UnrecognizedValue -> Rep UpdateFailure'UnrecognizedValue x #

to :: Rep UpdateFailure'UnrecognizedValue x -> UpdateFailure'UnrecognizedValue #

Generic VerifyChanBackupResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Associated Types

type Rep VerifyChanBackupResponse :: Type -> Type #

Methods

from :: VerifyChanBackupResponse -> Rep VerifyChanBackupResponse x #

to :: Rep VerifyChanBackupResponse x -> VerifyChanBackupResponse #

Generic BuildRouteRequest 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep BuildRouteRequest :: Type -> Type #

Methods

from :: BuildRouteRequest -> Rep BuildRouteRequest x #

to :: Rep BuildRouteRequest x -> BuildRouteRequest #

Generic BuildRouteResponse 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep BuildRouteResponse :: Type -> Type #

Methods

from :: BuildRouteResponse -> Rep BuildRouteResponse x #

to :: Rep BuildRouteResponse x -> BuildRouteResponse #

Generic ChanStatusAction 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep ChanStatusAction :: Type -> Type #

Methods

from :: ChanStatusAction -> Rep ChanStatusAction x #

to :: Rep ChanStatusAction x -> ChanStatusAction #

Generic ChanStatusAction'UnrecognizedValue 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep ChanStatusAction'UnrecognizedValue :: Type -> Type #

Methods

from :: ChanStatusAction'UnrecognizedValue -> Rep ChanStatusAction'UnrecognizedValue x #

to :: Rep ChanStatusAction'UnrecognizedValue x -> ChanStatusAction'UnrecognizedValue #

Generic CircuitKey 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep CircuitKey :: Type -> Type #

Methods

from :: CircuitKey -> Rep CircuitKey x #

to :: Rep CircuitKey x -> CircuitKey #

Generic FailureDetail 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep FailureDetail :: Type -> Type #

Methods

from :: FailureDetail -> Rep FailureDetail x #

to :: Rep FailureDetail x -> FailureDetail #

Generic FailureDetail'UnrecognizedValue 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep FailureDetail'UnrecognizedValue :: Type -> Type #

Methods

from :: FailureDetail'UnrecognizedValue -> Rep FailureDetail'UnrecognizedValue x #

to :: Rep FailureDetail'UnrecognizedValue x -> FailureDetail'UnrecognizedValue #

Generic ForwardEvent 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep ForwardEvent :: Type -> Type #

Methods

from :: ForwardEvent -> Rep ForwardEvent x #

to :: Rep ForwardEvent x -> ForwardEvent #

Generic ForwardFailEvent 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep ForwardFailEvent :: Type -> Type #

Methods

from :: ForwardFailEvent -> Rep ForwardFailEvent x #

to :: Rep ForwardFailEvent x -> ForwardFailEvent #

Generic ForwardHtlcInterceptRequest 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep ForwardHtlcInterceptRequest :: Type -> Type #

Methods

from :: ForwardHtlcInterceptRequest -> Rep ForwardHtlcInterceptRequest x #

to :: Rep ForwardHtlcInterceptRequest x -> ForwardHtlcInterceptRequest #

Generic ForwardHtlcInterceptRequest'CustomRecordsEntry 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep ForwardHtlcInterceptRequest'CustomRecordsEntry :: Type -> Type #

Methods

from :: ForwardHtlcInterceptRequest'CustomRecordsEntry -> Rep ForwardHtlcInterceptRequest'CustomRecordsEntry x #

to :: Rep ForwardHtlcInterceptRequest'CustomRecordsEntry x -> ForwardHtlcInterceptRequest'CustomRecordsEntry #

Generic ForwardHtlcInterceptResponse 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep ForwardHtlcInterceptResponse :: Type -> Type #

Methods

from :: ForwardHtlcInterceptResponse -> Rep ForwardHtlcInterceptResponse x #

to :: Rep ForwardHtlcInterceptResponse x -> ForwardHtlcInterceptResponse #

Generic GetMissionControlConfigRequest 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep GetMissionControlConfigRequest :: Type -> Type #

Methods

from :: GetMissionControlConfigRequest -> Rep GetMissionControlConfigRequest x #

to :: Rep GetMissionControlConfigRequest x -> GetMissionControlConfigRequest #

Generic GetMissionControlConfigResponse 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep GetMissionControlConfigResponse :: Type -> Type #

Methods

from :: GetMissionControlConfigResponse -> Rep GetMissionControlConfigResponse x #

to :: Rep GetMissionControlConfigResponse x -> GetMissionControlConfigResponse #

Generic HtlcEvent 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep HtlcEvent :: Type -> Type #

Methods

from :: HtlcEvent -> Rep HtlcEvent x #

to :: Rep HtlcEvent x -> HtlcEvent #

Generic HtlcEvent'Event 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep HtlcEvent'Event :: Type -> Type #

Methods

from :: HtlcEvent'Event -> Rep HtlcEvent'Event x #

to :: Rep HtlcEvent'Event x -> HtlcEvent'Event #

Generic HtlcEvent'EventType 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep HtlcEvent'EventType :: Type -> Type #

Methods

from :: HtlcEvent'EventType -> Rep HtlcEvent'EventType x #

to :: Rep HtlcEvent'EventType x -> HtlcEvent'EventType #

Generic HtlcEvent'EventType'UnrecognizedValue 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep HtlcEvent'EventType'UnrecognizedValue :: Type -> Type #

Methods

from :: HtlcEvent'EventType'UnrecognizedValue -> Rep HtlcEvent'EventType'UnrecognizedValue x #

to :: Rep HtlcEvent'EventType'UnrecognizedValue x -> HtlcEvent'EventType'UnrecognizedValue #

Generic HtlcInfo 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep HtlcInfo :: Type -> Type #

Methods

from :: HtlcInfo -> Rep HtlcInfo x #

to :: Rep HtlcInfo x -> HtlcInfo #

Generic LinkFailEvent 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep LinkFailEvent :: Type -> Type #

Methods

from :: LinkFailEvent -> Rep LinkFailEvent x #

to :: Rep LinkFailEvent x -> LinkFailEvent #

Generic MissionControlConfig 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep MissionControlConfig :: Type -> Type #

Methods

from :: MissionControlConfig -> Rep MissionControlConfig x #

to :: Rep MissionControlConfig x -> MissionControlConfig #

Generic PairData 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep PairData :: Type -> Type #

Methods

from :: PairData -> Rep PairData x #

to :: Rep PairData x -> PairData #

Generic PairHistory 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep PairHistory :: Type -> Type #

Methods

from :: PairHistory -> Rep PairHistory x #

to :: Rep PairHistory x -> PairHistory #

Generic PaymentState 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep PaymentState :: Type -> Type #

Methods

from :: PaymentState -> Rep PaymentState x #

to :: Rep PaymentState x -> PaymentState #

Generic PaymentState'UnrecognizedValue 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep PaymentState'UnrecognizedValue :: Type -> Type #

Methods

from :: PaymentState'UnrecognizedValue -> Rep PaymentState'UnrecognizedValue x #

to :: Rep PaymentState'UnrecognizedValue x -> PaymentState'UnrecognizedValue #

Generic PaymentStatus 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep PaymentStatus :: Type -> Type #

Methods

from :: PaymentStatus -> Rep PaymentStatus x #

to :: Rep PaymentStatus x -> PaymentStatus #

Generic QueryMissionControlRequest 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep QueryMissionControlRequest :: Type -> Type #

Methods

from :: QueryMissionControlRequest -> Rep QueryMissionControlRequest x #

to :: Rep QueryMissionControlRequest x -> QueryMissionControlRequest #

Generic QueryMissionControlResponse 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep QueryMissionControlResponse :: Type -> Type #

Methods

from :: QueryMissionControlResponse -> Rep QueryMissionControlResponse x #

to :: Rep QueryMissionControlResponse x -> QueryMissionControlResponse #

Generic QueryProbabilityRequest 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep QueryProbabilityRequest :: Type -> Type #

Methods

from :: QueryProbabilityRequest -> Rep QueryProbabilityRequest x #

to :: Rep QueryProbabilityRequest x -> QueryProbabilityRequest #

Generic QueryProbabilityResponse 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep QueryProbabilityResponse :: Type -> Type #

Methods

from :: QueryProbabilityResponse -> Rep QueryProbabilityResponse x #

to :: Rep QueryProbabilityResponse x -> QueryProbabilityResponse #

Generic ResetMissionControlRequest 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep ResetMissionControlRequest :: Type -> Type #

Methods

from :: ResetMissionControlRequest -> Rep ResetMissionControlRequest x #

to :: Rep ResetMissionControlRequest x -> ResetMissionControlRequest #

Generic ResetMissionControlResponse 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep ResetMissionControlResponse :: Type -> Type #

Methods

from :: ResetMissionControlResponse -> Rep ResetMissionControlResponse x #

to :: Rep ResetMissionControlResponse x -> ResetMissionControlResponse #

Generic ResolveHoldForwardAction 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep ResolveHoldForwardAction :: Type -> Type #

Methods

from :: ResolveHoldForwardAction -> Rep ResolveHoldForwardAction x #

to :: Rep ResolveHoldForwardAction x -> ResolveHoldForwardAction #

Generic ResolveHoldForwardAction'UnrecognizedValue 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep ResolveHoldForwardAction'UnrecognizedValue :: Type -> Type #

Methods

from :: ResolveHoldForwardAction'UnrecognizedValue -> Rep ResolveHoldForwardAction'UnrecognizedValue x #

to :: Rep ResolveHoldForwardAction'UnrecognizedValue x -> ResolveHoldForwardAction'UnrecognizedValue #

Generic RouteFeeRequest 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep RouteFeeRequest :: Type -> Type #

Methods

from :: RouteFeeRequest -> Rep RouteFeeRequest x #

to :: Rep RouteFeeRequest x -> RouteFeeRequest #

Generic RouteFeeResponse 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep RouteFeeResponse :: Type -> Type #

Methods

from :: RouteFeeResponse -> Rep RouteFeeResponse x #

to :: Rep RouteFeeResponse x -> RouteFeeResponse #

Generic SendPaymentRequest 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep SendPaymentRequest :: Type -> Type #

Methods

from :: SendPaymentRequest -> Rep SendPaymentRequest x #

to :: Rep SendPaymentRequest x -> SendPaymentRequest #

Generic SendPaymentRequest'DestCustomRecordsEntry 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep SendPaymentRequest'DestCustomRecordsEntry :: Type -> Type #

Methods

from :: SendPaymentRequest'DestCustomRecordsEntry -> Rep SendPaymentRequest'DestCustomRecordsEntry x #

to :: Rep SendPaymentRequest'DestCustomRecordsEntry x -> SendPaymentRequest'DestCustomRecordsEntry #

Generic SendToRouteRequest 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep SendToRouteRequest :: Type -> Type #

Methods

from :: SendToRouteRequest -> Rep SendToRouteRequest x #

to :: Rep SendToRouteRequest x -> SendToRouteRequest #

Generic SendToRouteResponse 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep SendToRouteResponse :: Type -> Type #

Methods

from :: SendToRouteResponse -> Rep SendToRouteResponse x #

to :: Rep SendToRouteResponse x -> SendToRouteResponse #

Generic SetMissionControlConfigRequest 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep SetMissionControlConfigRequest :: Type -> Type #

Methods

from :: SetMissionControlConfigRequest -> Rep SetMissionControlConfigRequest x #

to :: Rep SetMissionControlConfigRequest x -> SetMissionControlConfigRequest #

Generic SetMissionControlConfigResponse 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep SetMissionControlConfigResponse :: Type -> Type #

Methods

from :: SetMissionControlConfigResponse -> Rep SetMissionControlConfigResponse x #

to :: Rep SetMissionControlConfigResponse x -> SetMissionControlConfigResponse #

Generic SettleEvent 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep SettleEvent :: Type -> Type #

Methods

from :: SettleEvent -> Rep SettleEvent x #

to :: Rep SettleEvent x -> SettleEvent #

Generic SubscribeHtlcEventsRequest 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep SubscribeHtlcEventsRequest :: Type -> Type #

Methods

from :: SubscribeHtlcEventsRequest -> Rep SubscribeHtlcEventsRequest x #

to :: Rep SubscribeHtlcEventsRequest x -> SubscribeHtlcEventsRequest #

Generic TrackPaymentRequest 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep TrackPaymentRequest :: Type -> Type #

Methods

from :: TrackPaymentRequest -> Rep TrackPaymentRequest x #

to :: Rep TrackPaymentRequest x -> TrackPaymentRequest #

Generic UpdateChanStatusRequest 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep UpdateChanStatusRequest :: Type -> Type #

Methods

from :: UpdateChanStatusRequest -> Rep UpdateChanStatusRequest x #

to :: Rep UpdateChanStatusRequest x -> UpdateChanStatusRequest #

Generic UpdateChanStatusResponse 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep UpdateChanStatusResponse :: Type -> Type #

Methods

from :: UpdateChanStatusResponse -> Rep UpdateChanStatusResponse x #

to :: Rep UpdateChanStatusResponse x -> UpdateChanStatusResponse #

Generic XImportMissionControlRequest 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep XImportMissionControlRequest :: Type -> Type #

Methods

from :: XImportMissionControlRequest -> Rep XImportMissionControlRequest x #

to :: Rep XImportMissionControlRequest x -> XImportMissionControlRequest #

Generic XImportMissionControlResponse 
Instance details

Defined in Proto.Routerrpc.Router

Associated Types

type Rep XImportMissionControlResponse :: Type -> Type #

Methods

from :: XImportMissionControlResponse -> Rep XImportMissionControlResponse x #

to :: Rep XImportMissionControlResponse x -> XImportMissionControlResponse #

Generic InputScript 
Instance details

Defined in Proto.Signrpc.Signer

Associated Types

type Rep InputScript :: Type -> Type #

Methods

from :: InputScript -> Rep InputScript x #

to :: Rep InputScript x -> InputScript #

Generic InputScriptResp 
Instance details

Defined in Proto.Signrpc.Signer

Associated Types

type Rep InputScriptResp :: Type -> Type #

Methods

from :: InputScriptResp -> Rep InputScriptResp x #

to :: Rep InputScriptResp x -> InputScriptResp #

Generic KeyDescriptor 
Instance details

Defined in Proto.Signrpc.Signer

Associated Types

type Rep KeyDescriptor :: Type -> Type #

Methods

from :: KeyDescriptor -> Rep KeyDescriptor x #

to :: Rep KeyDescriptor x -> KeyDescriptor #

Generic KeyLocator 
Instance details

Defined in Proto.Signrpc.Signer

Associated Types

type Rep KeyLocator :: Type -> Type #

Methods

from :: KeyLocator -> Rep KeyLocator x #

to :: Rep KeyLocator x -> KeyLocator #

Generic SharedKeyRequest 
Instance details

Defined in Proto.Signrpc.Signer

Associated Types

type Rep SharedKeyRequest :: Type -> Type #

Methods

from :: SharedKeyRequest -> Rep SharedKeyRequest x #

to :: Rep SharedKeyRequest x -> SharedKeyRequest #

Generic SharedKeyResponse 
Instance details

Defined in Proto.Signrpc.Signer

Associated Types

type Rep SharedKeyResponse :: Type -> Type #

Methods

from :: SharedKeyResponse -> Rep SharedKeyResponse x #

to :: Rep SharedKeyResponse x -> SharedKeyResponse #

Generic SignDescriptor 
Instance details

Defined in Proto.Signrpc.Signer

Associated Types

type Rep SignDescriptor :: Type -> Type #

Methods

from :: SignDescriptor -> Rep SignDescriptor x #

to :: Rep SignDescriptor x -> SignDescriptor #

Generic SignMessageReq 
Instance details

Defined in Proto.Signrpc.Signer

Associated Types

type Rep SignMessageReq :: Type -> Type #

Methods

from :: SignMessageReq -> Rep SignMessageReq x #

to :: Rep SignMessageReq x -> SignMessageReq #

Generic SignMessageResp 
Instance details

Defined in Proto.Signrpc.Signer

Associated Types

type Rep SignMessageResp :: Type -> Type #

Methods

from :: SignMessageResp -> Rep SignMessageResp x #

to :: Rep SignMessageResp x -> SignMessageResp #

Generic SignReq 
Instance details

Defined in Proto.Signrpc.Signer

Associated Types

type Rep SignReq :: Type -> Type #

Methods

from :: SignReq -> Rep SignReq x #

to :: Rep SignReq x -> SignReq #

Generic SignResp 
Instance details

Defined in Proto.Signrpc.Signer

Associated Types

type Rep SignResp :: Type -> Type #

Methods

from :: SignResp -> Rep SignResp x #

to :: Rep SignResp x -> SignResp #

Generic TxOut 
Instance details

Defined in Proto.Signrpc.Signer

Associated Types

type Rep TxOut :: Type -> Type #

Methods

from :: TxOut -> Rep TxOut x #

to :: Rep TxOut x -> TxOut #

Generic VerifyMessageReq 
Instance details

Defined in Proto.Signrpc.Signer

Associated Types

type Rep VerifyMessageReq :: Type -> Type #

Methods

from :: VerifyMessageReq -> Rep VerifyMessageReq x #

to :: Rep VerifyMessageReq x -> VerifyMessageReq #

Generic VerifyMessageResp 
Instance details

Defined in Proto.Signrpc.Signer

Associated Types

type Rep VerifyMessageResp :: Type -> Type #

Methods

from :: VerifyMessageResp -> Rep VerifyMessageResp x #

to :: Rep VerifyMessageResp x -> VerifyMessageResp #

Generic Account 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep Account :: Type -> Type #

Methods

from :: Account -> Rep Account x #

to :: Rep Account x -> Account #

Generic AddrRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep AddrRequest :: Type -> Type #

Methods

from :: AddrRequest -> Rep AddrRequest x #

to :: Rep AddrRequest x -> AddrRequest #

Generic AddrResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep AddrResponse :: Type -> Type #

Methods

from :: AddrResponse -> Rep AddrResponse x #

to :: Rep AddrResponse x -> AddrResponse #

Generic AddressType 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep AddressType :: Type -> Type #

Methods

from :: AddressType -> Rep AddressType x #

to :: Rep AddressType x -> AddressType #

Generic AddressType'UnrecognizedValue 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep AddressType'UnrecognizedValue :: Type -> Type #

Methods

from :: AddressType'UnrecognizedValue -> Rep AddressType'UnrecognizedValue x #

to :: Rep AddressType'UnrecognizedValue x -> AddressType'UnrecognizedValue #

Generic BumpFeeRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep BumpFeeRequest :: Type -> Type #

Methods

from :: BumpFeeRequest -> Rep BumpFeeRequest x #

to :: Rep BumpFeeRequest x -> BumpFeeRequest #

Generic BumpFeeResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep BumpFeeResponse :: Type -> Type #

Methods

from :: BumpFeeResponse -> Rep BumpFeeResponse x #

to :: Rep BumpFeeResponse x -> BumpFeeResponse #

Generic EstimateFeeRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep EstimateFeeRequest :: Type -> Type #

Methods

from :: EstimateFeeRequest -> Rep EstimateFeeRequest x #

to :: Rep EstimateFeeRequest x -> EstimateFeeRequest #

Generic EstimateFeeResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep EstimateFeeResponse :: Type -> Type #

Methods

from :: EstimateFeeResponse -> Rep EstimateFeeResponse x #

to :: Rep EstimateFeeResponse x -> EstimateFeeResponse #

Generic FinalizePsbtRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep FinalizePsbtRequest :: Type -> Type #

Methods

from :: FinalizePsbtRequest -> Rep FinalizePsbtRequest x #

to :: Rep FinalizePsbtRequest x -> FinalizePsbtRequest #

Generic FinalizePsbtResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep FinalizePsbtResponse :: Type -> Type #

Methods

from :: FinalizePsbtResponse -> Rep FinalizePsbtResponse x #

to :: Rep FinalizePsbtResponse x -> FinalizePsbtResponse #

Generic FundPsbtRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep FundPsbtRequest :: Type -> Type #

Methods

from :: FundPsbtRequest -> Rep FundPsbtRequest x #

to :: Rep FundPsbtRequest x -> FundPsbtRequest #

Generic FundPsbtRequest'Fees 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep FundPsbtRequest'Fees :: Type -> Type #

Methods

from :: FundPsbtRequest'Fees -> Rep FundPsbtRequest'Fees x #

to :: Rep FundPsbtRequest'Fees x -> FundPsbtRequest'Fees #

Generic FundPsbtRequest'Template 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep FundPsbtRequest'Template :: Type -> Type #

Methods

from :: FundPsbtRequest'Template -> Rep FundPsbtRequest'Template x #

to :: Rep FundPsbtRequest'Template x -> FundPsbtRequest'Template #

Generic FundPsbtResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep FundPsbtResponse :: Type -> Type #

Methods

from :: FundPsbtResponse -> Rep FundPsbtResponse x #

to :: Rep FundPsbtResponse x -> FundPsbtResponse #

Generic ImportAccountRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep ImportAccountRequest :: Type -> Type #

Methods

from :: ImportAccountRequest -> Rep ImportAccountRequest x #

to :: Rep ImportAccountRequest x -> ImportAccountRequest #

Generic ImportAccountResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep ImportAccountResponse :: Type -> Type #

Methods

from :: ImportAccountResponse -> Rep ImportAccountResponse x #

to :: Rep ImportAccountResponse x -> ImportAccountResponse #

Generic ImportPublicKeyRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep ImportPublicKeyRequest :: Type -> Type #

Methods

from :: ImportPublicKeyRequest -> Rep ImportPublicKeyRequest x #

to :: Rep ImportPublicKeyRequest x -> ImportPublicKeyRequest #

Generic ImportPublicKeyResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep ImportPublicKeyResponse :: Type -> Type #

Methods

from :: ImportPublicKeyResponse -> Rep ImportPublicKeyResponse x #

to :: Rep ImportPublicKeyResponse x -> ImportPublicKeyResponse #

Generic KeyReq 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep KeyReq :: Type -> Type #

Methods

from :: KeyReq -> Rep KeyReq x #

to :: Rep KeyReq x -> KeyReq #

Generic LabelTransactionRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep LabelTransactionRequest :: Type -> Type #

Methods

from :: LabelTransactionRequest -> Rep LabelTransactionRequest x #

to :: Rep LabelTransactionRequest x -> LabelTransactionRequest #

Generic LabelTransactionResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep LabelTransactionResponse :: Type -> Type #

Methods

from :: LabelTransactionResponse -> Rep LabelTransactionResponse x #

to :: Rep LabelTransactionResponse x -> LabelTransactionResponse #

Generic LeaseOutputRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep LeaseOutputRequest :: Type -> Type #

Methods

from :: LeaseOutputRequest -> Rep LeaseOutputRequest x #

to :: Rep LeaseOutputRequest x -> LeaseOutputRequest #

Generic LeaseOutputResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep LeaseOutputResponse :: Type -> Type #

Methods

from :: LeaseOutputResponse -> Rep LeaseOutputResponse x #

to :: Rep LeaseOutputResponse x -> LeaseOutputResponse #

Generic ListAccountsRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep ListAccountsRequest :: Type -> Type #

Methods

from :: ListAccountsRequest -> Rep ListAccountsRequest x #

to :: Rep ListAccountsRequest x -> ListAccountsRequest #

Generic ListAccountsResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep ListAccountsResponse :: Type -> Type #

Methods

from :: ListAccountsResponse -> Rep ListAccountsResponse x #

to :: Rep ListAccountsResponse x -> ListAccountsResponse #

Generic ListLeasesRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep ListLeasesRequest :: Type -> Type #

Methods

from :: ListLeasesRequest -> Rep ListLeasesRequest x #

to :: Rep ListLeasesRequest x -> ListLeasesRequest #

Generic ListLeasesResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep ListLeasesResponse :: Type -> Type #

Methods

from :: ListLeasesResponse -> Rep ListLeasesResponse x #

to :: Rep ListLeasesResponse x -> ListLeasesResponse #

Generic ListSweepsRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep ListSweepsRequest :: Type -> Type #

Methods

from :: ListSweepsRequest -> Rep ListSweepsRequest x #

to :: Rep ListSweepsRequest x -> ListSweepsRequest #

Generic ListSweepsResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep ListSweepsResponse :: Type -> Type #

Methods

from :: ListSweepsResponse -> Rep ListSweepsResponse x #

to :: Rep ListSweepsResponse x -> ListSweepsResponse #

Generic ListSweepsResponse'Sweeps 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep ListSweepsResponse'Sweeps :: Type -> Type #

Methods

from :: ListSweepsResponse'Sweeps -> Rep ListSweepsResponse'Sweeps x #

to :: Rep ListSweepsResponse'Sweeps x -> ListSweepsResponse'Sweeps #

Generic ListSweepsResponse'TransactionIDs 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep ListSweepsResponse'TransactionIDs :: Type -> Type #

Methods

from :: ListSweepsResponse'TransactionIDs -> Rep ListSweepsResponse'TransactionIDs x #

to :: Rep ListSweepsResponse'TransactionIDs x -> ListSweepsResponse'TransactionIDs #

Generic ListUnspentRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep ListUnspentRequest :: Type -> Type #

Methods

from :: ListUnspentRequest -> Rep ListUnspentRequest x #

to :: Rep ListUnspentRequest x -> ListUnspentRequest #

Generic ListUnspentResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep ListUnspentResponse :: Type -> Type #

Methods

from :: ListUnspentResponse -> Rep ListUnspentResponse x #

to :: Rep ListUnspentResponse x -> ListUnspentResponse #

Generic PendingSweep 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep PendingSweep :: Type -> Type #

Methods

from :: PendingSweep -> Rep PendingSweep x #

to :: Rep PendingSweep x -> PendingSweep #

Generic PendingSweepsRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep PendingSweepsRequest :: Type -> Type #

Methods

from :: PendingSweepsRequest -> Rep PendingSweepsRequest x #

to :: Rep PendingSweepsRequest x -> PendingSweepsRequest #

Generic PendingSweepsResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep PendingSweepsResponse :: Type -> Type #

Methods

from :: PendingSweepsResponse -> Rep PendingSweepsResponse x #

to :: Rep PendingSweepsResponse x -> PendingSweepsResponse #

Generic PublishResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep PublishResponse :: Type -> Type #

Methods

from :: PublishResponse -> Rep PublishResponse x #

to :: Rep PublishResponse x -> PublishResponse #

Generic ReleaseOutputRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep ReleaseOutputRequest :: Type -> Type #

Methods

from :: ReleaseOutputRequest -> Rep ReleaseOutputRequest x #

to :: Rep ReleaseOutputRequest x -> ReleaseOutputRequest #

Generic ReleaseOutputResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep ReleaseOutputResponse :: Type -> Type #

Methods

from :: ReleaseOutputResponse -> Rep ReleaseOutputResponse x #

to :: Rep ReleaseOutputResponse x -> ReleaseOutputResponse #

Generic SendOutputsRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep SendOutputsRequest :: Type -> Type #

Methods

from :: SendOutputsRequest -> Rep SendOutputsRequest x #

to :: Rep SendOutputsRequest x -> SendOutputsRequest #

Generic SendOutputsResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep SendOutputsResponse :: Type -> Type #

Methods

from :: SendOutputsResponse -> Rep SendOutputsResponse x #

to :: Rep SendOutputsResponse x -> SendOutputsResponse #

Generic Transaction 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep Transaction :: Type -> Type #

Methods

from :: Transaction -> Rep Transaction x #

to :: Rep Transaction x -> Transaction #

Generic TxTemplate 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep TxTemplate :: Type -> Type #

Methods

from :: TxTemplate -> Rep TxTemplate x #

to :: Rep TxTemplate x -> TxTemplate #

Generic TxTemplate'OutputsEntry 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep TxTemplate'OutputsEntry :: Type -> Type #

Methods

from :: TxTemplate'OutputsEntry -> Rep TxTemplate'OutputsEntry x #

to :: Rep TxTemplate'OutputsEntry x -> TxTemplate'OutputsEntry #

Generic UtxoLease 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep UtxoLease :: Type -> Type #

Methods

from :: UtxoLease -> Rep UtxoLease x #

to :: Rep UtxoLease x -> UtxoLease #

Generic WitnessType 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep WitnessType :: Type -> Type #

Methods

from :: WitnessType -> Rep WitnessType x #

to :: Rep WitnessType x -> WitnessType #

Generic WitnessType'UnrecognizedValue 
Instance details

Defined in Proto.Walletrpc.Walletkit

Associated Types

type Rep WitnessType'UnrecognizedValue :: Type -> Type #

Methods

from :: WitnessType'UnrecognizedValue -> Rep WitnessType'UnrecognizedValue x #

to :: Rep WitnessType'UnrecognizedValue x -> WitnessType'UnrecognizedValue #

Generic ChangePasswordRequest 
Instance details

Defined in Proto.Walletunlocker

Associated Types

type Rep ChangePasswordRequest :: Type -> Type #

Methods

from :: ChangePasswordRequest -> Rep ChangePasswordRequest x #

to :: Rep ChangePasswordRequest x -> ChangePasswordRequest #

Generic ChangePasswordResponse 
Instance details

Defined in Proto.Walletunlocker

Associated Types

type Rep ChangePasswordResponse :: Type -> Type #

Methods

from :: ChangePasswordResponse -> Rep ChangePasswordResponse x #

to :: Rep ChangePasswordResponse x -> ChangePasswordResponse #

Generic GenSeedRequest 
Instance details

Defined in Proto.Walletunlocker

Associated Types

type Rep GenSeedRequest :: Type -> Type #

Methods

from :: GenSeedRequest -> Rep GenSeedRequest x #

to :: Rep GenSeedRequest x -> GenSeedRequest #

Generic GenSeedResponse 
Instance details

Defined in Proto.Walletunlocker

Associated Types

type Rep GenSeedResponse :: Type -> Type #

Methods

from :: GenSeedResponse -> Rep GenSeedResponse x #

to :: Rep GenSeedResponse x -> GenSeedResponse #

Generic InitWalletRequest 
Instance details

Defined in Proto.Walletunlocker

Associated Types

type Rep InitWalletRequest :: Type -> Type #

Methods

from :: InitWalletRequest -> Rep InitWalletRequest x #

to :: Rep InitWalletRequest x -> InitWalletRequest #

Generic InitWalletResponse 
Instance details

Defined in Proto.Walletunlocker

Associated Types

type Rep InitWalletResponse :: Type -> Type #

Methods

from :: InitWalletResponse -> Rep InitWalletResponse x #

to :: Rep InitWalletResponse x -> InitWalletResponse #

Generic UnlockWalletRequest 
Instance details

Defined in Proto.Walletunlocker

Associated Types

type Rep UnlockWalletRequest :: Type -> Type #

Methods

from :: UnlockWalletRequest -> Rep UnlockWalletRequest x #

to :: Rep UnlockWalletRequest x -> UnlockWalletRequest #

Generic UnlockWalletResponse 
Instance details

Defined in Proto.Walletunlocker

Associated Types

type Rep UnlockWalletResponse :: Type -> Type #

Methods

from :: UnlockWalletResponse -> Rep UnlockWalletResponse x #

to :: Rep UnlockWalletResponse x -> UnlockWalletResponse #

Generic WatchOnly 
Instance details

Defined in Proto.Walletunlocker

Associated Types

type Rep WatchOnly :: Type -> Type #

Methods

from :: WatchOnly -> Rep WatchOnly x #

to :: Rep WatchOnly x -> WatchOnly #

Generic WatchOnlyAccount 
Instance details

Defined in Proto.Walletunlocker

Associated Types

type Rep WatchOnlyAccount :: Type -> Type #

Methods

from :: WatchOnlyAccount -> Rep WatchOnlyAccount x #

to :: Rep WatchOnlyAccount x -> WatchOnlyAccount #

Generic Block Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Associated Types

type Rep Block :: Type -> Type #

Methods

from :: Block -> Rep Block x #

to :: Rep Block x -> Block #

Generic BlockChainInfo Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Associated Types

type Rep BlockChainInfo :: Type -> Type #

Methods

from :: BlockChainInfo -> Rep BlockChainInfo x #

to :: Rep BlockChainInfo x -> BlockChainInfo #

Generic BlockVerbose Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Associated Types

type Rep BlockVerbose :: Type -> Type #

Methods

from :: BlockVerbose -> Rep BlockVerbose x #

to :: Rep BlockVerbose x -> BlockVerbose #

Generic DecodedRawTransaction Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Associated Types

type Rep DecodedRawTransaction :: Type -> Type #

Methods

from :: DecodedRawTransaction -> Rep DecodedRawTransaction x #

to :: Rep DecodedRawTransaction x -> DecodedRawTransaction #

Generic ScriptPubKey Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Associated Types

type Rep ScriptPubKey :: Type -> Type #

Methods

from :: ScriptPubKey -> Rep ScriptPubKey x #

to :: Rep ScriptPubKey x -> ScriptPubKey #

Generic ScriptSig Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Associated Types

type Rep ScriptSig :: Type -> Type #

Methods

from :: ScriptSig -> Rep ScriptSig x #

to :: Rep ScriptSig x -> ScriptSig #

Generic TxIn Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Associated Types

type Rep TxIn :: Type -> Type #

Methods

from :: TxIn -> Rep TxIn x #

to :: Rep TxIn x -> TxIn #

Generic TxOut Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Associated Types

type Rep TxOut :: Type -> Type #

Methods

from :: TxOut -> Rep TxOut x #

to :: Rep TxOut x -> TxOut #

Generic TxnOutputType Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Associated Types

type Rep TxnOutputType :: Type -> Type #

Methods

from :: TxnOutputType -> Rep TxnOutputType x #

to :: Rep TxnOutputType x -> TxnOutputType #

Generic TransactionID Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Associated Types

type Rep TransactionID :: Type -> Type #

Methods

from :: TransactionID -> Rep TransactionID x #

to :: Rep TransactionID x -> TransactionID #

Generic URI 
Instance details

Defined in Network.URI

Associated Types

type Rep URI :: Type -> Type #

Methods

from :: URI -> Rep URI x #

to :: Rep URI x -> URI #

Generic URIAuth 
Instance details

Defined in Network.URI

Associated Types

type Rep URIAuth :: Type -> Type #

Methods

from :: URIAuth -> Rep URIAuth x #

to :: Rep URIAuth x -> URIAuth #

Generic ConnectInfo 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Associated Types

type Rep ConnectInfo :: Type -> Type #

Generic Mode 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Associated Types

type Rep Mode :: Type -> Type #

Methods

from :: Mode -> Rep Mode x #

to :: Rep Mode x -> Mode #

Generic Style 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Associated Types

type Rep Style :: Type -> Type #

Methods

from :: Style -> Rep Style x #

to :: Rep Style x -> Style #

Generic TextDetails 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Associated Types

type Rep TextDetails :: Type -> Type #

Generic Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Associated Types

type Rep Doc :: Type -> Type #

Methods

from :: Doc -> Rep Doc x #

to :: Rep Doc x -> Doc #

Generic ColorOptions 
Instance details

Defined in Text.Pretty.Simple.Internal.Color

Associated Types

type Rep ColorOptions :: Type -> Type #

Generic Style 
Instance details

Defined in Text.Pretty.Simple.Internal.Color

Associated Types

type Rep Style :: Type -> Type #

Methods

from :: Style -> Rep Style x #

to :: Rep Style x -> Style #

Generic Expr 
Instance details

Defined in Text.Pretty.Simple.Internal.Expr

Associated Types

type Rep Expr :: Type -> Type #

Methods

from :: Expr -> Rep Expr x #

to :: Rep Expr x -> Expr #

Generic CheckColorTty 
Instance details

Defined in Text.Pretty.Simple.Internal.Printer

Associated Types

type Rep CheckColorTty :: Type -> Type #

Generic OutputOptions 
Instance details

Defined in Text.Pretty.Simple.Internal.Printer

Associated Types

type Rep OutputOptions :: Type -> Type #

Generic StringOutputStyle 
Instance details

Defined in Text.Pretty.Simple.Internal.Printer

Associated Types

type Rep StringOutputStyle :: Type -> Type #

Generic CompactSig 
Instance details

Defined in Crypto.Secp256k1

Associated Types

type Rep CompactSig :: Type -> Type #

Generic Msg 
Instance details

Defined in Crypto.Secp256k1

Associated Types

type Rep Msg :: Type -> Type #

Methods

from :: Msg -> Rep Msg x #

to :: Rep Msg x -> Msg #

Generic PubKey 
Instance details

Defined in Crypto.Secp256k1

Associated Types

type Rep PubKey :: Type -> Type #

Methods

from :: PubKey -> Rep PubKey x #

to :: Rep PubKey x -> PubKey #

Generic SecKey 
Instance details

Defined in Crypto.Secp256k1

Associated Types

type Rep SecKey :: Type -> Type #

Methods

from :: SecKey -> Rep SecKey x #

to :: Rep SecKey x -> SecKey #

Generic Sig 
Instance details

Defined in Crypto.Secp256k1

Associated Types

type Rep Sig :: Type -> Type #

Methods

from :: Sig -> Rep Sig x #

to :: Rep Sig x -> Sig #

Generic Tweak 
Instance details

Defined in Crypto.Secp256k1

Associated Types

type Rep Tweak :: Type -> Type #

Methods

from :: Tweak -> Rep Tweak x #

to :: Rep Tweak x -> Tweak #

Generic VarType 
Instance details

Defined in Text.Shakespeare

Associated Types

type Rep VarType :: Type -> Type #

Methods

from :: VarType -> Rep VarType x #

to :: Rep VarType x -> VarType #

Generic AnnLookup 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep AnnLookup :: Type -> Type #

Generic AnnTarget 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep AnnTarget :: Type -> Type #

Generic Bang 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Bang :: Type -> Type #

Methods

from :: Bang -> Rep Bang x #

to :: Rep Bang x -> Bang #

Generic Body 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Body :: Type -> Type #

Methods

from :: Body -> Rep Body x #

to :: Rep Body x -> Body #

Generic Bytes 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Bytes :: Type -> Type #

Methods

from :: Bytes -> Rep Bytes x #

to :: Rep Bytes x -> Bytes #

Generic Callconv 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Callconv :: Type -> Type #

Methods

from :: Callconv -> Rep Callconv x #

to :: Rep Callconv x -> Callconv #

Generic Clause 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Clause :: Type -> Type #

Methods

from :: Clause -> Rep Clause x #

to :: Rep Clause x -> Clause #

Generic Con 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Con :: Type -> Type #

Methods

from :: Con -> Rep Con x #

to :: Rep Con x -> Con #

Generic Dec 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Dec :: Type -> Type #

Methods

from :: Dec -> Rep Dec x #

to :: Rep Dec x -> Dec #

Generic DecidedStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep DecidedStrictness :: Type -> Type #

Generic DerivClause 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep DerivClause :: Type -> Type #

Generic DerivStrategy 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep DerivStrategy :: Type -> Type #

Generic Exp 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Exp :: Type -> Type #

Methods

from :: Exp -> Rep Exp x #

to :: Rep Exp x -> Exp #

Generic FamilyResultSig 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep FamilyResultSig :: Type -> Type #

Generic Fixity 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Fixity :: Type -> Type #

Methods

from :: Fixity -> Rep Fixity x #

to :: Rep Fixity x -> Fixity #

Generic FixityDirection 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep FixityDirection :: Type -> Type #

Generic Foreign 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Foreign :: Type -> Type #

Methods

from :: Foreign -> Rep Foreign x #

to :: Rep Foreign x -> Foreign #

Generic FunDep 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep FunDep :: Type -> Type #

Methods

from :: FunDep -> Rep FunDep x #

to :: Rep FunDep x -> FunDep #

Generic Guard 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Guard :: Type -> Type #

Methods

from :: Guard -> Rep Guard x #

to :: Rep Guard x -> Guard #

Generic Info 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Info :: Type -> Type #

Methods

from :: Info -> Rep Info x #

to :: Rep Info x -> Info #

Generic InjectivityAnn 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep InjectivityAnn :: Type -> Type #

Generic Inline 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Inline :: Type -> Type #

Methods

from :: Inline -> Rep Inline x #

to :: Rep Inline x -> Inline #

Generic Lit 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Lit :: Type -> Type #

Methods

from :: Lit -> Rep Lit x #

to :: Rep Lit x -> Lit #

Generic Loc 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Loc :: Type -> Type #

Methods

from :: Loc -> Rep Loc x #

to :: Rep Loc x -> Loc #

Generic Match 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Match :: Type -> Type #

Methods

from :: Match -> Rep Match x #

to :: Rep Match x -> Match #

Generic ModName 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep ModName :: Type -> Type #

Methods

from :: ModName -> Rep ModName x #

to :: Rep ModName x -> ModName #

Generic Module 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Module :: Type -> Type #

Methods

from :: Module -> Rep Module x #

to :: Rep Module x -> Module #

Generic ModuleInfo 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep ModuleInfo :: Type -> Type #

Generic Name 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Name :: Type -> Type #

Methods

from :: Name -> Rep Name x #

to :: Rep Name x -> Name #

Generic NameFlavour 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep NameFlavour :: Type -> Type #

Generic NameSpace 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep NameSpace :: Type -> Type #

Generic OccName 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep OccName :: Type -> Type #

Methods

from :: OccName -> Rep OccName x #

to :: Rep OccName x -> OccName #

Generic Overlap 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Overlap :: Type -> Type #

Methods

from :: Overlap -> Rep Overlap x #

to :: Rep Overlap x -> Overlap #

Generic Pat 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Pat :: Type -> Type #

Methods

from :: Pat -> Rep Pat x #

to :: Rep Pat x -> Pat #

Generic PatSynArgs 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep PatSynArgs :: Type -> Type #

Generic PatSynDir 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep PatSynDir :: Type -> Type #

Generic Phases 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Phases :: Type -> Type #

Methods

from :: Phases -> Rep Phases x #

to :: Rep Phases x -> Phases #

Generic PkgName 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep PkgName :: Type -> Type #

Methods

from :: PkgName -> Rep PkgName x #

to :: Rep PkgName x -> PkgName #

Generic Pragma 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Pragma :: Type -> Type #

Methods

from :: Pragma -> Rep Pragma x #

to :: Rep Pragma x -> Pragma #

Generic Range 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Range :: Type -> Type #

Methods

from :: Range -> Rep Range x #

to :: Rep Range x -> Range #

Generic Role 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Role :: Type -> Type #

Methods

from :: Role -> Rep Role x #

to :: Rep Role x -> Role #

Generic RuleBndr 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep RuleBndr :: Type -> Type #

Methods

from :: RuleBndr -> Rep RuleBndr x #

to :: Rep RuleBndr x -> RuleBndr #

Generic RuleMatch 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep RuleMatch :: Type -> Type #

Generic Safety 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Safety :: Type -> Type #

Methods

from :: Safety -> Rep Safety x #

to :: Rep Safety x -> Safety #

Generic SourceStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep SourceStrictness :: Type -> Type #

Generic SourceUnpackedness 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep SourceUnpackedness :: Type -> Type #

Generic Specificity 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Specificity :: Type -> Type #

Generic Stmt 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Stmt :: Type -> Type #

Methods

from :: Stmt -> Rep Stmt x #

to :: Rep Stmt x -> Stmt #

Generic TyLit 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep TyLit :: Type -> Type #

Methods

from :: TyLit -> Rep TyLit x #

to :: Rep TyLit x -> TyLit #

Generic TySynEqn 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep TySynEqn :: Type -> Type #

Methods

from :: TySynEqn -> Rep TySynEqn x #

to :: Rep TySynEqn x -> TySynEqn #

Generic Type 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Type :: Type -> Type #

Methods

from :: Type -> Rep Type x #

to :: Rep Type x -> Type #

Generic TypeFamilyHead 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep TypeFamilyHead :: Type -> Type #

Generic ConstructorInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep ConstructorInfo :: Type -> Type #

Generic ConstructorVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep ConstructorVariant :: Type -> Type #

Generic DatatypeInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep DatatypeInfo :: Type -> Type #

Generic DatatypeVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep DatatypeVariant :: Type -> Type #

Generic FieldStrictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep FieldStrictness :: Type -> Type #

Generic Strictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep Strictness :: Type -> Type #

Generic Unpackedness 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep Unpackedness :: Type -> Type #

Generic 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 #

Generic Int128 
Instance details

Defined in Data.WideWord.Int128

Associated Types

type Rep Int128 :: Type -> Type #

Methods

from :: Int128 -> Rep Int128 x #

to :: Rep Int128 x -> Int128 #

Generic Word128 
Instance details

Defined in Data.WideWord.Word128

Associated Types

type Rep Word128 :: Type -> Type #

Methods

from :: Word128 -> Rep Word128 x #

to :: Rep Word128 x -> Word128 #

Generic Word256 
Instance details

Defined in Data.WideWord.Word256

Associated Types

type Rep Word256 :: Type -> Type #

Methods

from :: Word256 -> Rep Word256 x #

to :: Rep Word256 x -> Word256 #

Generic Content 
Instance details

Defined in Data.XML.Types

Associated Types

type Rep Content :: Type -> Type #

Methods

from :: Content -> Rep Content x #

to :: Rep Content x -> Content #

Generic Doctype 
Instance details

Defined in Data.XML.Types

Associated Types

type Rep Doctype :: Type -> Type #

Methods

from :: Doctype -> Rep Doctype x #

to :: Rep Doctype x -> Doctype #

Generic Document 
Instance details

Defined in Data.XML.Types

Associated Types

type Rep Document :: Type -> Type #

Methods

from :: Document -> Rep Document x #

to :: Rep Document x -> Document #

Generic Element 
Instance details

Defined in Data.XML.Types

Associated Types

type Rep Element :: Type -> Type #

Methods

from :: Element -> Rep Element x #

to :: Rep Element x -> Element #

Generic Event 
Instance details

Defined in Data.XML.Types

Associated Types

type Rep Event :: Type -> Type #

Methods

from :: Event -> Rep Event x #

to :: Rep Event x -> Event #

Generic ExternalID 
Instance details

Defined in Data.XML.Types

Associated Types

type Rep ExternalID :: Type -> Type #

Generic Instruction 
Instance details

Defined in Data.XML.Types

Associated Types

type Rep Instruction :: Type -> Type #

Generic Miscellaneous 
Instance details

Defined in Data.XML.Types

Associated Types

type Rep Miscellaneous :: Type -> Type #

Generic Name 
Instance details

Defined in Data.XML.Types

Associated Types

type Rep Name :: Type -> Type #

Methods

from :: Name -> Rep Name x #

to :: Rep Name x -> Name #

Generic Node 
Instance details

Defined in Data.XML.Types

Associated Types

type Rep Node :: Type -> Type #

Methods

from :: Node -> Rep Node x #

to :: Rep Node x -> Node #

Generic Prologue 
Instance details

Defined in Data.XML.Types

Associated Types

type Rep Prologue :: Type -> Type #

Methods

from :: Prologue -> Rep Prologue x #

to :: Rep Prologue x -> Prologue #

Generic ErrorResponse 
Instance details

Defined in Yesod.Core.Types

Associated Types

type Rep ErrorResponse :: Type -> Type #

Generic CompressionLevel 
Instance details

Defined in Codec.Compression.Zlib.Stream

Associated Types

type Rep CompressionLevel :: Type -> Type #

Generic CompressionStrategy 
Instance details

Defined in Codec.Compression.Zlib.Stream

Associated Types

type Rep CompressionStrategy :: Type -> Type #

Generic Format 
Instance details

Defined in Codec.Compression.Zlib.Stream

Associated Types

type Rep Format :: Type -> Type #

Methods

from :: Format -> Rep Format x #

to :: Rep Format x -> Format #

Generic MemoryLevel 
Instance details

Defined in Codec.Compression.Zlib.Stream

Associated Types

type Rep MemoryLevel :: Type -> Type #

Generic Method 
Instance details

Defined in Codec.Compression.Zlib.Stream

Associated Types

type Rep Method :: Type -> Type #

Methods

from :: Method -> Rep Method x #

to :: Rep Method x -> Method #

Generic WindowBits 
Instance details

Defined in Codec.Compression.Zlib.Stream

Associated Types

type Rep WindowBits :: Type -> Type #

Generic () 
Instance details

Defined in GHC.Generics

Associated Types

type Rep () :: Type -> Type #

Methods

from :: () -> Rep () x #

to :: Rep () x -> () #

Generic Bool 
Instance details

Defined in GHC.Generics

Associated Types

type Rep Bool :: Type -> Type #

Methods

from :: Bool -> Rep Bool x #

to :: Rep Bool x -> Bool #

Generic (Only a) 
Instance details

Defined in Data.Tuple.Only

Associated Types

type Rep (Only a) :: Type -> Type #

Methods

from :: Only a -> Rep (Only a) x #

to :: Rep (Only a) x -> Only a #

Generic (ZipList a) 
Instance details

Defined in Control.Applicative

Associated Types

type Rep (ZipList a) :: Type -> Type #

Methods

from :: ZipList a -> Rep (ZipList a) x #

to :: Rep (ZipList a) x -> ZipList a #

Generic (Complex a) 
Instance details

Defined in Data.Complex

Associated Types

type Rep (Complex a) :: Type -> Type #

Methods

from :: Complex a -> Rep (Complex a) x #

to :: Rep (Complex a) x -> Complex a #

Generic (Identity a) 
Instance details

Defined in Data.Functor.Identity

Associated Types

type Rep (Identity a) :: Type -> Type #

Methods

from :: Identity a -> Rep (Identity a) x #

to :: Rep (Identity a) x -> Identity a #

Generic (First a) 
Instance details

Defined in Data.Monoid

Associated Types

type Rep (First a) :: Type -> Type #

Methods

from :: First a -> Rep (First a) x #

to :: Rep (First a) x -> First a #

Generic (Last a) 
Instance details

Defined in Data.Monoid

Associated Types

type Rep (Last a) :: Type -> Type #

Methods

from :: Last a -> Rep (Last a) x #

to :: Rep (Last a) x -> Last a #

Generic (Down a) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Down a) :: Type -> Type #

Methods

from :: Down a -> Rep (Down a) x #

to :: Rep (Down a) x -> Down a #

Generic (First a) 
Instance details

Defined in Data.Semigroup

Associated Types

type Rep (First a) :: Type -> Type #

Methods

from :: First a -> Rep (First a) x #

to :: Rep (First a) x -> First a #

Generic (Last a) 
Instance details

Defined in Data.Semigroup

Associated Types

type Rep (Last a) :: Type -> Type #

Methods

from :: Last a -> Rep (Last a) x #

to :: Rep (Last a) x -> Last a #

Generic (Max a) 
Instance details

Defined in Data.Semigroup

Associated Types

type Rep (Max a) :: Type -> Type #

Methods

from :: Max a -> Rep (Max a) x #

to :: Rep (Max a) x -> Max a #

Generic (Min a) 
Instance details

Defined in Data.Semigroup

Associated Types

type Rep (Min a) :: Type -> Type #

Methods

from :: Min a -> Rep (Min a) x #

to :: Rep (Min a) x -> Min a #

Generic (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 (WrappedMonoid m) 
Instance details

Defined in Data.Semigroup

Associated Types

type Rep (WrappedMonoid m) :: Type -> Type #

Generic (Dual a) 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep (Dual a) :: Type -> Type #

Methods

from :: Dual a -> Rep (Dual a) x #

to :: Rep (Dual a) x -> Dual a #

Generic (Endo a) 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep (Endo a) :: Type -> Type #

Methods

from :: Endo a -> Rep (Endo a) x #

to :: Rep (Endo a) x -> Endo a #

Generic (Product a) 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep (Product a) :: Type -> Type #

Methods

from :: Product a -> Rep (Product a) x #

to :: Rep (Product a) x -> Product a #

Generic (Sum a) 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep (Sum a) :: Type -> Type #

Methods

from :: Sum a -> Rep (Sum a) x #

to :: Rep (Sum a) x -> Sum a #

Generic (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 (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 (OnChainAddress mrel) Source # 
Instance details

Defined in BtcLsp.Data.Smart

Associated Types

type Rep (OnChainAddress mrel) :: Type -> Type #

Methods

from :: OnChainAddress mrel -> Rep (OnChainAddress mrel) x #

to :: Rep (OnChainAddress mrel) x -> OnChainAddress mrel #

Generic (Liquidity dir) Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep (Liquidity dir) :: Type -> Type #

Methods

from :: Liquidity dir -> Rep (Liquidity dir) x #

to :: Rep (Liquidity dir) x -> Liquidity dir #

Generic (LnInvoice mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep (LnInvoice mrel) :: Type -> Type #

Methods

from :: LnInvoice mrel -> Rep (LnInvoice mrel) x #

to :: Rep (LnInvoice mrel) x -> LnInvoice mrel #

Generic (UnsafeOnChainAddress mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep (UnsafeOnChainAddress mrel) :: Type -> Type #

Generic (Uuid tab) Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep (Uuid tab) :: Type -> Type #

Methods

from :: Uuid tab -> Rep (Uuid tab) x #

to :: Rep (Uuid tab) x -> Uuid tab #

Generic (Digit a) 
Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep (Digit a) :: Type -> Type #

Methods

from :: Digit a -> Rep (Digit a) x #

to :: Rep (Digit a) x -> Digit a #

Generic (Elem a) 
Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep (Elem a) :: Type -> Type #

Methods

from :: Elem a -> Rep (Elem a) x #

to :: Rep (Elem a) x -> Elem a #

Generic (FingerTree a) 
Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep (FingerTree a) :: Type -> Type #

Methods

from :: FingerTree a -> Rep (FingerTree a) x #

to :: Rep (FingerTree a) x -> FingerTree a #

Generic (Node a) 
Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep (Node a) :: Type -> Type #

Methods

from :: Node a -> Rep (Node a) x #

to :: Rep (Node a) x -> Node a #

Generic (ViewL a) 
Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep (ViewL a) :: Type -> Type #

Methods

from :: ViewL a -> Rep (ViewL a) x #

to :: Rep (ViewL a) x -> ViewL a #

Generic (ViewR a) 
Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep (ViewR a) :: Type -> Type #

Methods

from :: ViewR a -> Rep (ViewR a) x #

to :: Rep (ViewR a) x -> ViewR a #

Generic (Tree a) 
Instance details

Defined in Data.Tree

Associated Types

type Rep (Tree a) :: Type -> Type #

Methods

from :: Tree a -> Rep (Tree a) x #

to :: Rep (Tree a) x -> Tree a #

Generic (Fix f) 
Instance details

Defined in Data.Fix

Associated Types

type Rep (Fix f) :: Type -> Type #

Methods

from :: Fix f -> Rep (Fix f) x #

to :: Rep (Fix f) x -> Fix f #

Generic (HistoriedResponse body) 
Instance details

Defined in Network.HTTP.Client

Associated Types

type Rep (HistoriedResponse body) :: Type -> Type #

Methods

from :: HistoriedResponse body -> Rep (HistoriedResponse body) x #

to :: Rep (HistoriedResponse body) x -> HistoriedResponse body #

Generic (AddrRange a) 
Instance details

Defined in Data.IP.Range

Associated Types

type Rep (AddrRange a) :: Type -> Type #

Methods

from :: AddrRange a -> Rep (AddrRange a) x #

to :: Rep (AddrRange a) x -> AddrRange a #

Generic (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 (PendingUpdate a) 
Instance details

Defined in LndClient.Data.Channel

Associated Types

type Rep (PendingUpdate a) :: Type -> Type #

Methods

from :: PendingUpdate a -> Rep (PendingUpdate a) x #

to :: Rep (PendingUpdate a) x -> PendingUpdate a #

Generic (TxId a) 
Instance details

Defined in LndClient.Data.Newtype

Associated Types

type Rep (TxId a) :: Type -> Type #

Methods

from :: TxId a -> Rep (TxId a) x #

to :: Rep (TxId a) x -> TxId a #

Generic (Vout a) 
Instance details

Defined in LndClient.Data.Newtype

Associated Types

type Rep (Vout a) :: Type -> Type #

Methods

from :: Vout a -> Rep (Vout a) x #

to :: Rep (Vout a) x -> Vout 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 (Key Block) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Associated Types

type Rep (Key Block) :: Type -> Type #

Methods

from :: Key Block -> Rep (Key Block) x #

to :: Rep (Key Block) x -> Key Block #

Generic (Key LnChan) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Associated Types

type Rep (Key LnChan) :: Type -> Type #

Methods

from :: Key LnChan -> Rep (Key LnChan) x #

to :: Rep (Key LnChan) x -> Key LnChan #

Generic (Key SwapIntoLn) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Associated Types

type Rep (Key SwapIntoLn) :: Type -> Type #

Generic (Key SwapUtxo) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Associated Types

type Rep (Key SwapUtxo) :: Type -> Type #

Methods

from :: Key SwapUtxo -> Rep (Key SwapUtxo) x #

to :: Rep (Key SwapUtxo) x -> Key SwapUtxo #

Generic (Key User) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Associated Types

type Rep (Key User) :: Type -> Type #

Methods

from :: Key User -> Rep (Key User) x #

to :: Rep (Key User) x -> Key User #

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 (CommaSeparated a) 
Instance details

Defined in Text.Pretty.Simple.Internal.Expr

Associated Types

type Rep (CommaSeparated a) :: Type -> Type #

Generic (Doc ann) 
Instance details

Defined in Prettyprinter.Internal

Associated Types

type Rep (Doc ann) :: Type -> Type #

Methods

from :: Doc ann -> Rep (Doc ann) x #

to :: Rep (Doc ann) x -> Doc ann #

Generic (SimpleDocStream ann) 
Instance details

Defined in Prettyprinter.Internal

Associated Types

type Rep (SimpleDocStream ann) :: Type -> Type #

Methods

from :: SimpleDocStream ann -> Rep (SimpleDocStream ann) x #

to :: Rep (SimpleDocStream ann) x -> SimpleDocStream ann #

Generic (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 (Maybe a) 
Instance details

Defined in Data.Strict.Maybe

Associated Types

type Rep (Maybe a) :: Type -> Type #

Methods

from :: Maybe a -> Rep (Maybe a) x #

to :: Rep (Maybe a) x -> Maybe a #

Generic (TyVarBndr flag) 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep (TyVarBndr flag) :: Type -> Type #

Methods

from :: TyVarBndr flag -> Rep (TyVarBndr flag) x #

to :: Rep (TyVarBndr flag) x -> TyVarBndr flag #

Generic (Maybe a) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Maybe a) :: Type -> Type #

Methods

from :: Maybe a -> Rep (Maybe a) x #

to :: Rep (Maybe a) x -> Maybe a #

Generic (a) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a) :: Type -> Type #

Methods

from :: (a) -> Rep (a) x #

to :: Rep (a) x -> (a) #

Generic [a] 
Instance details

Defined in GHC.Generics

Associated Types

type Rep [a] :: Type -> Type #

Methods

from :: [a] -> Rep [a] x #

to :: Rep [a] x -> [a] #

Generic (WrappedMonad m a) 
Instance details

Defined in Control.Applicative

Associated Types

type Rep (WrappedMonad m a) :: Type -> Type #

Methods

from :: WrappedMonad m a -> Rep (WrappedMonad m a) x #

to :: Rep (WrappedMonad m a) x -> WrappedMonad m a #

Generic (Either a b) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Either a b) :: Type -> Type #

Methods

from :: Either a b -> Rep (Either a b) x #

to :: Rep (Either a b) x -> Either a b #

Generic (Proxy t) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Proxy t) :: Type -> Type #

Methods

from :: Proxy t -> Rep (Proxy t) x #

to :: Rep (Proxy t) x -> Proxy t #

Generic (Arg a b) 
Instance details

Defined in Data.Semigroup

Associated Types

type Rep (Arg a b) :: Type -> Type #

Methods

from :: Arg a b -> Rep (Arg a b) x #

to :: Rep (Arg a b) x -> Arg a b #

Generic (U1 p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (U1 p) :: Type -> Type #

Methods

from :: U1 p -> Rep (U1 p) x #

to :: Rep (U1 p) x -> U1 p #

Generic (V1 p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (V1 p) :: Type -> Type #

Methods

from :: V1 p -> Rep (V1 p) x #

to :: Rep (V1 p) x -> V1 p #

Generic (Gr a b) 
Instance details

Defined in Data.Graph.Inductive.PatriciaTree

Associated Types

type Rep (Gr a b) :: Type -> Type #

Methods

from :: Gr a b -> Rep (Gr a b) x #

to :: Rep (Gr a b) x -> Gr a b #

Generic (Cofree f a) 
Instance details

Defined in Control.Comonad.Cofree

Associated Types

type Rep (Cofree f a) :: Type -> Type #

Methods

from :: Cofree f a -> Rep (Cofree f a) x #

to :: Rep (Cofree f a) x -> Cofree f a #

Generic (Free f a) 
Instance details

Defined in Control.Monad.Free

Associated Types

type Rep (Free f a) :: Type -> Type #

Methods

from :: Free f a -> Rep (Free f a) x #

to :: Rep (Free f a) x -> Free f a #

Generic (Either a b) 
Instance details

Defined in Data.Strict.Either

Associated Types

type Rep (Either a b) :: Type -> Type #

Methods

from :: Either a b -> Rep (Either a b) x #

to :: Rep (Either a b) x -> Either a b #

Generic (These a b) 
Instance details

Defined in Data.Strict.These

Associated Types

type Rep (These a b) :: Type -> Type #

Methods

from :: These a b -> Rep (These a b) x #

to :: Rep (These a b) x -> These a b #

Generic (Pair a b) 
Instance details

Defined in Data.Strict.Tuple

Associated Types

type Rep (Pair a b) :: Type -> Type #

Methods

from :: Pair a b -> Rep (Pair a b) x #

to :: Rep (Pair a b) x -> Pair a b #

Generic (These a b) 
Instance details

Defined in Data.These

Associated Types

type Rep (These a b) :: Type -> Type #

Methods

from :: These a b -> Rep (These a b) x #

to :: Rep (These a b) x -> These a b #

Generic (a, b) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b) :: Type -> Type #

Methods

from :: (a, b) -> Rep (a, b) x #

to :: Rep (a, b) x -> (a, b) #

Generic (WrappedArrow a b c) 
Instance details

Defined in Control.Applicative

Associated Types

type Rep (WrappedArrow a b c) :: Type -> Type #

Methods

from :: WrappedArrow a b c -> Rep (WrappedArrow a b c) x #

to :: Rep (WrappedArrow a b c) x -> WrappedArrow a b c #

Generic (Kleisli m a b) 
Instance details

Defined in Control.Arrow

Associated Types

type Rep (Kleisli m a b) :: Type -> Type #

Methods

from :: Kleisli m a b -> Rep (Kleisli m a b) x #

to :: Rep (Kleisli m a b) x -> Kleisli m a b #

Generic (Const a b) 
Instance details

Defined in Data.Functor.Const

Associated Types

type Rep (Const a b) :: Type -> Type #

Methods

from :: Const a b -> Rep (Const a b) x #

to :: Rep (Const a b) x -> Const a b #

Generic (Ap f a) 
Instance details

Defined in Data.Monoid

Associated Types

type Rep (Ap f a) :: Type -> Type #

Methods

from :: Ap f a -> Rep (Ap f a) x #

to :: Rep (Ap f a) x -> Ap f a #

Generic (Alt f a) 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep (Alt f a) :: Type -> Type #

Methods

from :: Alt f a -> Rep (Alt f a) x #

to :: Rep (Alt f a) x -> Alt f a #

Generic (Rec1 f p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Rec1 f p) :: Type -> Type #

Methods

from :: Rec1 f p -> Rep (Rec1 f p) x #

to :: Rep (Rec1 f p) x -> Rec1 f p #

Generic (URec (Ptr ()) p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec (Ptr ()) p) :: Type -> Type #

Methods

from :: URec (Ptr ()) p -> Rep (URec (Ptr ()) p) x #

to :: Rep (URec (Ptr ()) p) x -> URec (Ptr ()) p #

Generic (URec Char p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Char p) :: Type -> Type #

Methods

from :: URec Char p -> Rep (URec Char p) x #

to :: Rep (URec Char p) x -> URec Char p #

Generic (URec Double p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Double p) :: Type -> Type #

Methods

from :: URec Double p -> Rep (URec Double p) x #

to :: Rep (URec Double p) x -> URec Double p #

Generic (URec Float p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Float p) :: Type -> Type #

Methods

from :: URec Float p -> Rep (URec Float p) x #

to :: Rep (URec Float p) x -> URec Float p #

Generic (URec Int p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Int p) :: Type -> Type #

Methods

from :: URec Int p -> Rep (URec Int p) x #

to :: Rep (URec Int p) x -> URec Int p #

Generic (URec Word p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Word p) :: Type -> Type #

Methods

from :: URec Word p -> Rep (URec Word p) x #

to :: Rep (URec Word p) x -> URec Word p #

Generic (Join p a) 
Instance details

Defined in Data.Bifunctor.Join

Associated Types

type Rep (Join p a) :: Type -> Type #

Methods

from :: Join p a -> Rep (Join p a) x #

to :: Rep (Join p a) x -> Join p a #

Generic (Money owner btcl mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep (Money owner btcl mrel) :: Type -> Type #

Methods

from :: Money owner btcl mrel -> Rep (Money owner btcl mrel) x #

to :: Rep (Money owner btcl mrel) x -> Money owner btcl mrel #

Generic (FreeF f a b) 
Instance details

Defined in Control.Monad.Trans.Free

Associated Types

type Rep (FreeF f a b) :: Type -> Type #

Methods

from :: FreeF f a b -> Rep (FreeF f a b) x #

to :: Rep (FreeF f a b) x -> FreeF f a b #

Generic (Tagged s b) 
Instance details

Defined in Data.Tagged

Associated Types

type Rep (Tagged s b) :: Type -> Type #

Methods

from :: Tagged s b -> Rep (Tagged s b) x #

to :: Rep (Tagged s b) x -> Tagged s b #

Generic (These1 f g a) 
Instance details

Defined in Data.Functor.These

Associated Types

type Rep (These1 f g a) :: Type -> Type #

Methods

from :: These1 f g a -> Rep (These1 f g a) x #

to :: Rep (These1 f g a) x -> These1 f g a #

Generic (a, b, c) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c) :: Type -> Type #

Methods

from :: (a, b, c) -> Rep (a, b, c) x #

to :: Rep (a, b, c) x -> (a, b, c) #

Generic (Product f g a) 
Instance details

Defined in Data.Functor.Product

Associated Types

type Rep (Product f g a) :: Type -> Type #

Methods

from :: Product f g a -> Rep (Product f g a) x #

to :: Rep (Product f g a) x -> Product f g a #

Generic (Sum f g a) 
Instance details

Defined in Data.Functor.Sum

Associated Types

type Rep (Sum f g a) :: Type -> Type #

Methods

from :: Sum f g a -> Rep (Sum f g a) x #

to :: Rep (Sum f g a) x -> Sum f g a #

Generic ((f :*: g) p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep ((f :*: g) p) :: Type -> Type #

Methods

from :: (f :*: g) p -> Rep ((f :*: g) p) x #

to :: Rep ((f :*: g) p) x -> (f :*: g) p #

Generic ((f :+: g) p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep ((f :+: g) p) :: Type -> Type #

Methods

from :: (f :+: g) p -> Rep ((f :+: g) p) x #

to :: Rep ((f :+: g) p) x -> (f :+: g) p #

Generic (K1 i c p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (K1 i c p) :: Type -> Type #

Methods

from :: K1 i c p -> Rep (K1 i c p) x #

to :: Rep (K1 i c p) x -> K1 i c p #

Generic (a, b, c, d) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d) :: Type -> Type #

Methods

from :: (a, b, c, d) -> Rep (a, b, c, d) x #

to :: Rep (a, b, c, d) x -> (a, b, c, d) #

Generic (Compose f g a) 
Instance details

Defined in Data.Functor.Compose

Associated Types

type Rep (Compose f g a) :: Type -> Type #

Methods

from :: Compose f g a -> Rep (Compose f g a) x #

to :: Rep (Compose f g a) x -> Compose f g a #

Generic ((f :.: g) p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep ((f :.: g) p) :: Type -> Type #

Methods

from :: (f :.: g) p -> Rep ((f :.: g) p) x #

to :: Rep ((f :.: g) p) x -> (f :.: g) p #

Generic (M1 i c f p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (M1 i c f p) :: Type -> Type #

Methods

from :: M1 i c f p -> Rep (M1 i c f p) x #

to :: Rep (M1 i c f p) x -> M1 i c f p #

Generic (Clown f a b) 
Instance details

Defined in Data.Bifunctor.Clown

Associated Types

type Rep (Clown f a b) :: Type -> Type #

Methods

from :: Clown f a b -> Rep (Clown f a b) x #

to :: Rep (Clown f a b) x -> Clown f a b #

Generic (Flip p a b) 
Instance details

Defined in Data.Bifunctor.Flip

Associated Types

type Rep (Flip p a b) :: Type -> Type #

Methods

from :: Flip p a b -> Rep (Flip p a b) x #

to :: Rep (Flip p a b) x -> Flip p a b #

Generic (Joker g a b) 
Instance details

Defined in Data.Bifunctor.Joker

Associated Types

type Rep (Joker g a b) :: Type -> Type #

Methods

from :: Joker g a b -> Rep (Joker g a b) x #

to :: Rep (Joker g a b) x -> Joker g a b #

Generic (WrappedBifunctor p a b) 
Instance details

Defined in Data.Bifunctor.Wrapped

Associated Types

type Rep (WrappedBifunctor p a b) :: Type -> Type #

Methods

from :: WrappedBifunctor p a b -> Rep (WrappedBifunctor p a b) x #

to :: Rep (WrappedBifunctor p a b) x -> WrappedBifunctor p a b #

Generic (a, b, c, d, e) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e) :: Type -> Type #

Methods

from :: (a, b, c, d, e) -> Rep (a, b, c, d, e) x #

to :: Rep (a, b, c, d, e) x -> (a, b, c, d, e) #

Generic (Product f g a b) 
Instance details

Defined in Data.Bifunctor.Product

Associated Types

type Rep (Product f g a b) :: Type -> Type #

Methods

from :: Product f g a b -> Rep (Product f g a b) x #

to :: Rep (Product f g a b) x -> Product f g a b #

Generic (Sum p q a b) 
Instance details

Defined in Data.Bifunctor.Sum

Associated Types

type Rep (Sum p q a b) :: Type -> Type #

Methods

from :: Sum p q a b -> Rep (Sum p q a b) x #

to :: Rep (Sum p q a b) x -> Sum p q a b #

Generic (a, b, c, d, e, f) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e, f) :: Type -> Type #

Methods

from :: (a, b, c, d, e, f) -> Rep (a, b, c, d, e, f) x #

to :: Rep (a, b, c, d, e, f) x -> (a, b, c, d, e, f) #

Generic (Tannen f p a b) 
Instance details

Defined in Data.Bifunctor.Tannen

Associated Types

type Rep (Tannen f p a b) :: Type -> Type #

Methods

from :: Tannen f p a b -> Rep (Tannen f p a b) x #

to :: Rep (Tannen f p a b) x -> Tannen f p a b #

Generic (a, b, c, d, e, f, g) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e, f, g) :: Type -> Type #

Methods

from :: (a, b, c, d, e, f, g) -> Rep (a, b, c, d, e, f, g) x #

to :: Rep (a, b, c, d, e, f, g) x -> (a, b, c, d, e, f, g) #

Generic (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

Instances details
SymbolToField sym rec typ => IsLabel sym (EntityField rec typ)

This instance delegates to SymbolToField to provide OverloadedLabels support to the EntityField type.

Since: persistent-2.11.0.0

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 following:

Associativity
x <> (y <> z) = (x <> y) <> z

Since: base-4.9.0.0

Minimal complete definition

(<>)

Methods

(<>) :: a -> a -> a infixr 6 #

An associative operation.

>>> [1,2,3] <> [4,5,6]
[1,2,3,4,5,6]

sconcat :: NonEmpty a -> a #

Reduce a non-empty list with <>

The default definition should be sufficient, but this can be overridden for efficiency.

>>> import Data.List.NonEmpty (NonEmpty (..))
>>> sconcat $ "Hello" :| [" ", "Haskell", "!"]
"Hello Haskell!"

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 \(\mathcal{O}(1)\) by picking stimes = stimesIdempotent or stimes = stimesIdempotentMonoid respectively.

>>> stimes 4 [1]
[1,1,1,1]

Instances

Instances details
Semigroup Series 
Instance details

Defined in Data.Aeson.Encoding.Internal

Semigroup More 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

(<>) :: More -> More -> More #

sconcat :: NonEmpty More -> More #

stimes :: Integral b => b -> More -> More #

Semigroup All

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

(<>) :: All -> All -> All #

sconcat :: NonEmpty All -> All #

stimes :: Integral b => b -> All -> All #

Semigroup Any

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

(<>) :: Any -> Any -> Any #

sconcat :: NonEmpty Any -> Any #

stimes :: Integral b => b -> Any -> Any #

Semigroup Void

Since: base-4.9.0.0

Instance details

Defined in Data.Void

Methods

(<>) :: Void -> Void -> Void #

sconcat :: NonEmpty Void -> Void #

stimes :: Integral b => b -> Void -> Void #

Semigroup String 
Instance details

Defined in Basement.UTF8.Base

Semigroup Attribute 
Instance details

Defined in Text.Blaze.Internal

Semigroup AttributeValue 
Instance details

Defined in Text.Blaze.Internal

Semigroup ChoiceString 
Instance details

Defined in Text.Blaze.Internal

Semigroup HtmlClassAttr Source # 
Instance details

Defined in BtcLsp.Yesod.Data.Widget

Semigroup Bytes 
Instance details

Defined in Data.Bytes.Internal

Methods

(<>) :: Bytes -> Bytes -> Bytes #

sconcat :: NonEmpty Bytes -> Bytes #

stimes :: Integral b => b -> Bytes -> Bytes #

Semigroup Builder 
Instance details

Defined in Data.ByteString.Builder.Internal

Semigroup ByteString 
Instance details

Defined in Data.ByteString.Internal

Semigroup ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Semigroup ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Semigroup Timespan 
Instance details

Defined in Chronos

Semigroup IntSet

Since: containers-0.5.7

Instance details

Defined in Data.IntSet.Internal

Semigroup DistinctClause 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Semigroup GroupByClause 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Semigroup LimitClause 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Semigroup SideData 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Semigroup WhereClause 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Semigroup LogStr 
Instance details

Defined in System.Log.FastLogger.LogStr

Semigroup Ordering

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Semigroup CookieJar 
Instance details

Defined in Network.HTTP.Client.Types

Semigroup RequestBody 
Instance details

Defined in Network.HTTP.Client.Types

Semigroup LogStr 
Instance details

Defined in Katip.Core

Semigroup Namespace 
Instance details

Defined in Katip.Core

Semigroup PayloadSelection 
Instance details

Defined in Katip.Core

Semigroup Scribe

Combine two scribes. Publishes to the left scribe if the left would permit the item and to the right scribe if the right would permit the item. Finalizers are called in sequence from left to right.

Instance details

Defined in Katip.Core

Semigroup SimpleLogPayload 
Instance details

Defined in Katip.Core

Semigroup LogContexts 
Instance details

Defined in Katip.Monadic

Semigroup EntityConstraintDefs 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

(<>) :: EntityConstraintDefs -> EntityConstraintDefs -> EntityConstraintDefs #

sconcat :: NonEmpty EntityConstraintDefs -> EntityConstraintDefs #

stimes :: Integral b => b -> EntityConstraintDefs -> EntityConstraintDefs #

Semigroup LinesWithComments 
Instance details

Defined in Database.Persist.Quasi.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 AnsiStyle

Keep the first decision for each of foreground color, background color, boldness, italication, and underlining. If a certain style is not set, the terminal’s default will be used.

Example:

color Red <> color Green

is red because the first color wins, and not bold because (or if) that’s the terminal’s default.

Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Semigroup ByteArray 
Instance details

Defined in Data.Primitive.ByteArray

Semigroup Registry 
Instance details

Defined in Data.ProtoLens.Message

Methods

(<>) :: Registry -> Registry -> Registry #

sconcat :: NonEmpty Registry -> Registry #

stimes :: Integral b => b -> Registry -> Registry #

Semigroup Mixin 
Instance details

Defined in Text.Internal.Css

Methods

(<>) :: Mixin -> Mixin -> Mixin #

sconcat :: NonEmpty Mixin -> Mixin #

stimes :: Integral b => b -> Mixin -> Mixin #

Semigroup Javascript 
Instance details

Defined in Text.Julius

Semigroup Builder 
Instance details

Defined in Data.Text.Internal.Builder

Semigroup ShortText 
Instance details

Defined in Data.Text.Short.Internal

Semigroup MergedValue 
Instance details

Defined in Data.Yaml.Config

Methods

(<>) :: MergedValue -> MergedValue -> MergedValue #

sconcat :: NonEmpty MergedValue -> MergedValue #

stimes :: Integral b => b -> MergedValue -> MergedValue #

Semigroup MergedValue 
Instance details

Defined in Yesod.Default.Config2

Semigroup LiteApp 
Instance details

Defined in Yesod.Core.Internal.LiteApp

Semigroup Enctype 
Instance details

Defined in Yesod.Form.Types

Semigroup ()

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

(<>) :: () -> () -> () #

sconcat :: NonEmpty () -> () #

stimes :: Integral b => b -> () -> () #

Semigroup (IResult a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

(<>) :: IResult a -> IResult a -> IResult a #

sconcat :: NonEmpty (IResult a) -> IResult a #

stimes :: Integral b => b -> IResult a -> IResult a #

Semigroup (Parser a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

(<>) :: Parser a -> Parser a -> Parser a #

sconcat :: NonEmpty (Parser a) -> Parser a #

stimes :: Integral b => b -> Parser a -> Parser a #

Semigroup (Result a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

(<>) :: Result a -> Result a -> Result a #

sconcat :: NonEmpty (Result a) -> Result a #

stimes :: Integral b => b -> Result a -> Result a #

Semigroup a => Semigroup (Concurrently a)

Only defined by async for base >= 4.9

Since: async-2.1.0

Instance details

Defined in Control.Concurrent.Async

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 (Down a)

Since: base-4.11.0.0

Instance details

Defined in Data.Ord

Methods

(<>) :: Down a -> Down a -> Down a #

sconcat :: NonEmpty (Down a) -> Down a #

stimes :: Integral b => b -> Down a -> Down a #

Semigroup (First a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(<>) :: First a -> First a -> First a #

sconcat :: NonEmpty (First a) -> First a #

stimes :: Integral b => b -> First a -> First a #

Semigroup (Last a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(<>) :: Last a -> Last a -> Last a #

sconcat :: NonEmpty (Last a) -> Last a #

stimes :: Integral b => b -> Last a -> Last a #

Ord a => Semigroup (Max a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(<>) :: Max a -> Max a -> Max a #

sconcat :: NonEmpty (Max a) -> Max a #

stimes :: Integral b => b -> Max a -> Max a #

Ord a => Semigroup (Min a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(<>) :: Min a -> Min a -> Min a #

sconcat :: NonEmpty (Min a) -> Min a #

stimes :: Integral b => b -> Min a -> Min a #

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 #

Monoid m => Semigroup (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Semigroup a => Semigroup (Dual a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

(<>) :: Dual a -> Dual a -> Dual a #

sconcat :: NonEmpty (Dual a) -> Dual a #

stimes :: Integral b => b -> Dual a -> Dual a #

Semigroup (Endo a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

(<>) :: Endo a -> Endo a -> Endo a #

sconcat :: NonEmpty (Endo a) -> Endo a #

stimes :: Integral b => b -> Endo a -> Endo a #

Num a => Semigroup (Product a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

(<>) :: Product a -> Product a -> Product a #

sconcat :: NonEmpty (Product a) -> Product a #

stimes :: Integral b => b -> Product a -> Product a #

Num a => Semigroup (Sum a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

(<>) :: Sum a -> Sum a -> Sum a #

sconcat :: NonEmpty (Sum a) -> Sum a #

stimes :: Integral b => b -> Sum a -> Sum a #

Semigroup (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 p => Semigroup (Par1 p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

(<>) :: Par1 p -> Par1 p -> Par1 p #

sconcat :: NonEmpty (Par1 p) -> Par1 p #

stimes :: Integral b => b -> Par1 p -> Par1 p #

PrimType ty => Semigroup (Block ty) 
Instance details

Defined in Basement.Block.Base

Methods

(<>) :: Block ty -> Block ty -> Block ty #

sconcat :: NonEmpty (Block ty) -> Block ty #

stimes :: Integral b => b -> Block ty -> Block ty #

Semigroup (CountOf ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

(<>) :: CountOf ty -> CountOf ty -> CountOf ty #

sconcat :: NonEmpty (CountOf ty) -> CountOf ty #

stimes :: Integral b => b -> CountOf ty -> CountOf ty #

PrimType ty => Semigroup (UArray ty) 
Instance details

Defined in Basement.UArray.Base

Methods

(<>) :: UArray ty -> UArray ty -> UArray ty #

sconcat :: NonEmpty (UArray ty) -> UArray ty #

stimes :: Integral b => b -> UArray ty -> UArray ty #

Monoid a => Semigroup (MarkupM a) 
Instance details

Defined in Text.Blaze.Internal

Methods

(<>) :: MarkupM a -> MarkupM a -> MarkupM a #

sconcat :: NonEmpty (MarkupM a) -> MarkupM a #

stimes :: Integral b => b -> MarkupM a -> MarkupM 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 #

Semigroup (IntMap a)

Since: containers-0.5.7

Instance details

Defined in Data.IntMap.Internal

Methods

(<>) :: IntMap a -> IntMap a -> IntMap a #

sconcat :: NonEmpty (IntMap a) -> IntMap a #

stimes :: Integral b => b -> IntMap a -> IntMap a #

Semigroup (Seq a)

Since: containers-0.5.7

Instance details

Defined in Data.Sequence.Internal

Methods

(<>) :: Seq a -> Seq a -> Seq a #

sconcat :: NonEmpty (Seq a) -> Seq a #

stimes :: Integral b => b -> Seq a -> Seq a #

Semigroup (MergeSet a) 
Instance details

Defined in Data.Set.Internal

Methods

(<>) :: MergeSet a -> MergeSet a -> MergeSet a #

sconcat :: NonEmpty (MergeSet a) -> MergeSet a #

stimes :: Integral b => b -> MergeSet a -> MergeSet a #

Ord a => Semigroup (Set a)

Since: containers-0.5.7

Instance details

Defined in Data.Set.Internal

Methods

(<>) :: Set a -> Set a -> Set a #

sconcat :: NonEmpty (Set a) -> Set a #

stimes :: Integral b => b -> Set a -> Set a #

Semigroup (DNonEmpty a) 
Instance details

Defined in Data.DList.DNonEmpty.Internal

Methods

(<>) :: DNonEmpty a -> DNonEmpty a -> DNonEmpty a #

sconcat :: NonEmpty (DNonEmpty a) -> DNonEmpty a #

stimes :: Integral b => b -> DNonEmpty a -> DNonEmpty a #

Semigroup (DList a) 
Instance details

Defined in Data.DList.Internal

Methods

(<>) :: DList a -> DList a -> DList a #

sconcat :: NonEmpty (DList a) -> DList a #

stimes :: Integral b => b -> DList a -> DList a #

Semigroup a => Semigroup (IO a)

Since: base-4.10.0.0

Instance details

Defined in GHC.Base

Methods

(<>) :: IO a -> IO a -> IO a #

sconcat :: NonEmpty (IO a) -> IO a #

stimes :: Integral b => b -> IO a -> IO a #

Semigroup (First a) 
Instance details

Defined in Lens.Family

Methods

(<>) :: First a -> First a -> First a #

sconcat :: NonEmpty (First a) -> First a #

stimes :: Integral b => b -> First a -> First a #

Semigroup (Last a) 
Instance details

Defined in Lens.Family

Methods

(<>) :: Last a -> Last a -> Last a #

sconcat :: NonEmpty (Last a) -> Last a #

stimes :: Integral b => b -> Last a -> Last a #

Semigroup a => Semigroup (May a) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

(<>) :: May a -> May a -> May a #

sconcat :: NonEmpty (May a) -> May a #

stimes :: Integral b => b -> May a -> May a #

(Semigroup mono, GrowingAppend mono) => Semigroup (NonNull mono) 
Instance details

Defined in Data.NonNull

Methods

(<>) :: NonNull mono -> NonNull mono -> NonNull mono #

sconcat :: NonEmpty (NonNull mono) -> NonNull mono #

stimes :: Integral b => b -> NonNull mono -> NonNull mono #

Semigroup (SetOnceAtMost a) 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

(<>) :: SetOnceAtMost a -> SetOnceAtMost a -> SetOnceAtMost a #

sconcat :: NonEmpty (SetOnceAtMost a) -> SetOnceAtMost a #

stimes :: Integral b => b -> SetOnceAtMost a -> SetOnceAtMost 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 (Doc ann)
x <> y = hcat [x, y]
>>> "hello" <> "world" :: Doc ann
helloworld
Instance details

Defined in Prettyprinter.Internal

Methods

(<>) :: Doc ann -> Doc ann -> Doc ann #

sconcat :: NonEmpty (Doc ann) -> Doc ann #

stimes :: Integral b => b -> Doc ann -> Doc ann #

Semigroup (Array a)

Since: primitive-0.6.3.0

Instance details

Defined in Data.Primitive.Array

Methods

(<>) :: Array a -> Array a -> Array a #

sconcat :: NonEmpty (Array a) -> Array a #

stimes :: Integral b => b -> Array a -> Array a #

Semigroup (PrimArray a)

Since: primitive-0.6.4.0

Instance details

Defined in Data.Primitive.PrimArray

Methods

(<>) :: PrimArray a -> PrimArray a -> PrimArray a #

sconcat :: NonEmpty (PrimArray a) -> PrimArray a #

stimes :: Integral b => b -> PrimArray a -> PrimArray a #

Semigroup (SmallArray a)

Since: primitive-0.6.3.0

Instance details

Defined in Data.Primitive.SmallArray

PrimUnlifted a => Semigroup (UnliftedArray a) 
Instance details

Defined in Data.Primitive.Unlifted.Array

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 a => Semigroup (Maybe a) 
Instance details

Defined in Data.Strict.Maybe

Methods

(<>) :: Maybe a -> Maybe a -> Maybe a #

sconcat :: NonEmpty (Maybe a) -> Maybe a #

stimes :: Integral b => b -> Maybe a -> Maybe a #

Semigroup a => Semigroup (Q a)

Since: template-haskell-2.17.0.0

Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(<>) :: Q a -> Q a -> Q a #

sconcat :: NonEmpty (Q a) -> Q a #

stimes :: Integral b => b -> Q a -> Q a #

(Hashable a, Eq a) => Semigroup (HashSet a)

<> = union

O(n+m)

To obtain good performance, the smaller set must be presented as the first argument.

Examples

Expand
>>> fromList [1,2] <> fromList [2,3]
fromList [1,2,3]
Instance details

Defined in Data.HashSet.Internal

Methods

(<>) :: HashSet a -> HashSet a -> HashSet a #

sconcat :: NonEmpty (HashSet a) -> HashSet a #

stimes :: Integral b => b -> HashSet a -> HashSet a #

Semigroup (Vault s) 
Instance details

Defined in Data.Vault.ST.Lazy

Methods

(<>) :: Vault s -> Vault s -> Vault s #

sconcat :: NonEmpty (Vault s) -> Vault s #

stimes :: Integral b => b -> Vault s -> Vault s #

Semigroup (Vector a) 
Instance details

Defined in Data.Vector

Methods

(<>) :: Vector a -> Vector a -> Vector a #

sconcat :: NonEmpty (Vector a) -> Vector a #

stimes :: Integral b => b -> Vector a -> Vector a #

Prim a => Semigroup (Vector a) 
Instance details

Defined in Data.Vector.Primitive

Methods

(<>) :: Vector a -> Vector a -> Vector a #

sconcat :: NonEmpty (Vector a) -> Vector a #

stimes :: Integral b => b -> Vector a -> Vector a #

Storable a => Semigroup (Vector a) 
Instance details

Defined in Data.Vector.Storable

Methods

(<>) :: Vector a -> Vector a -> Vector a #

sconcat :: NonEmpty (Vector a) -> Vector a #

stimes :: Integral b => b -> Vector a -> Vector a #

Semigroup (Body url) 
Instance details

Defined in Yesod.Core.Types

Methods

(<>) :: Body url -> Body url -> Body url #

sconcat :: NonEmpty (Body url) -> Body url #

stimes :: Integral b => b -> Body url -> Body url #

Semigroup (GWData a) 
Instance details

Defined in Yesod.Core.Types

Methods

(<>) :: GWData a -> GWData a -> GWData a #

sconcat :: NonEmpty (GWData a) -> GWData a #

stimes :: Integral b => b -> GWData a -> GWData a #

Semigroup (Head url) 
Instance details

Defined in Yesod.Core.Types

Methods

(<>) :: Head url -> Head url -> Head url #

sconcat :: NonEmpty (Head url) -> Head url #

stimes :: Integral b => b -> Head url -> Head url #

Semigroup (UniqueList x) 
Instance details

Defined in Yesod.Core.Types

Semigroup m => Semigroup (FormResult m) 
Instance details

Defined in Yesod.Form.Types

Semigroup a => Semigroup (Maybe a)

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

(<>) :: Maybe a -> Maybe a -> Maybe a #

sconcat :: NonEmpty (Maybe a) -> Maybe a #

stimes :: Integral b => b -> Maybe a -> Maybe a #

Semigroup a => Semigroup (a)

Since: base-4.15

Instance details

Defined in GHC.Base

Methods

(<>) :: (a) -> (a) -> (a) #

sconcat :: NonEmpty (a) -> (a) #

stimes :: Integral b => b -> (a) -> (a) #

Semigroup [a]

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

(<>) :: [a] -> [a] -> [a] #

sconcat :: NonEmpty [a] -> [a] #

stimes :: Integral b => b -> [a] -> [a] #

Semigroup (Parser i a) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

(<>) :: Parser i a -> Parser i a -> Parser i a #

sconcat :: NonEmpty (Parser i a) -> Parser i a #

stimes :: Integral b => b -> Parser i a -> Parser i a #

Semigroup (Either a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Either

Methods

(<>) :: Either a b -> Either a b -> Either a b #

sconcat :: NonEmpty (Either a b) -> Either a b #

stimes :: Integral b0 => b0 -> Either a b -> Either a b #

Semigroup (Proxy s)

Since: base-4.9.0.0

Instance details

Defined in Data.Proxy

Methods

(<>) :: Proxy s -> Proxy s -> Proxy s #

sconcat :: NonEmpty (Proxy s) -> Proxy s #

stimes :: Integral b => b -> Proxy s -> Proxy s #

Semigroup (U1 p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

(<>) :: U1 p -> U1 p -> U1 p #

sconcat :: NonEmpty (U1 p) -> U1 p #

stimes :: Integral b => b -> U1 p -> U1 p #

Semigroup (V1 p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

(<>) :: V1 p -> V1 p -> V1 p #

sconcat :: NonEmpty (V1 p) -> V1 p #

stimes :: Integral b => b -> V1 p -> V1 p #

Semigroup a => Semigroup (ST s a)

Since: base-4.11.0.0

Instance details

Defined in GHC.ST

Methods

(<>) :: ST s a -> ST s a -> ST s a #

sconcat :: NonEmpty (ST s a) -> ST s a #

stimes :: Integral b => b -> ST s a -> ST s a #

Ord k => Semigroup (Map k v) 
Instance details

Defined in Data.Map.Internal

Methods

(<>) :: Map k v -> Map k v -> Map k v #

sconcat :: NonEmpty (Map k v) -> Map k v #

stimes :: Integral b => b -> Map k v -> Map k v #

Semigroup (Mod t a) 
Instance details

Defined in Env.Internal.Parser

Methods

(<>) :: Mod t a -> Mod t a -> Mod t a #

sconcat :: NonEmpty (Mod t a) -> Mod t a #

stimes :: Integral b => b -> Mod t a -> Mod t a #

(Semigroup e, Semigroup r) => Semigroup (AllE e r) 
Instance details

Defined in Control.Error.Util

Methods

(<>) :: AllE e r -> AllE e r -> AllE e r #

sconcat :: NonEmpty (AllE e r) -> AllE e r #

stimes :: Integral b => b -> AllE e r -> AllE e r #

(Semigroup e, Semigroup r) => Semigroup (AnyE e r) 
Instance details

Defined in Control.Error.Util

Methods

(<>) :: AnyE e r -> AnyE e r -> AnyE e r #

sconcat :: NonEmpty (AnyE e r) -> AnyE e r #

stimes :: Integral b => b -> AnyE e r -> AnyE e r #

Apply f => Semigroup (Act f a) 
Instance details

Defined in Data.Key

Methods

(<>) :: Act f a -> Act f a -> Act f a #

sconcat :: NonEmpty (Act f a) -> Act f a #

stimes :: Integral b => b -> Act f a -> Act f a #

Applicative f => Semigroup (Traversed a f) 
Instance details

Defined in Lens.Micro

Methods

(<>) :: Traversed a f -> Traversed a f -> Traversed a f #

sconcat :: NonEmpty (Traversed a f) -> Traversed a f #

stimes :: Integral b => b -> Traversed a f -> Traversed a f #

Semigroup a => Semigroup (Err e a) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

(<>) :: Err e a -> Err e a -> Err e a #

sconcat :: NonEmpty (Err e a) -> Err e a #

stimes :: Integral b => b -> Err e a -> Err e a #

Semigroup (Either a b) 
Instance details

Defined in Data.Strict.Either

Methods

(<>) :: Either a b -> Either a b -> Either a b #

sconcat :: NonEmpty (Either a b) -> Either a b #

stimes :: Integral b0 => b0 -> Either a b -> Either a b #

(Semigroup a, Semigroup b) => Semigroup (These a b) 
Instance details

Defined in Data.Strict.These

Methods

(<>) :: These a b -> These a b -> These a b #

sconcat :: NonEmpty (These a b) -> These a b #

stimes :: Integral b0 => b0 -> These a b -> These a b #

(Semigroup a, Semigroup b) => Semigroup (Pair a b) 
Instance details

Defined in Data.Strict.Tuple

Methods

(<>) :: Pair a b -> Pair a b -> Pair a b #

sconcat :: NonEmpty (Pair a b) -> Pair a b #

stimes :: Integral b0 => b0 -> Pair a b -> Pair a b #

(Semigroup a, Semigroup b) => Semigroup (These a b) 
Instance details

Defined in Data.These

Methods

(<>) :: These a b -> These a b -> These a b #

sconcat :: NonEmpty (These a b) -> These a b #

stimes :: Integral b0 => b0 -> These a b -> These a b #

(MonadUnliftIO m, Semigroup a) => Semigroup (Conc m a)

Since: unliftio-0.2.9.0

Instance details

Defined in UnliftIO.Internals.Async

Methods

(<>) :: Conc m a -> Conc m a -> Conc m a #

sconcat :: NonEmpty (Conc m a) -> Conc m a #

stimes :: Integral b => b -> Conc m a -> Conc m a #

(MonadUnliftIO m, Semigroup a) => Semigroup (Concurrently m a)

Only defined by async for base >= 4.9.

Since: unliftio-0.1.0.0

Instance details

Defined in UnliftIO.Internals.Async

Methods

(<>) :: Concurrently m a -> Concurrently m a -> Concurrently m a #

sconcat :: NonEmpty (Concurrently m a) -> Concurrently m a #

stimes :: Integral b => b -> Concurrently m a -> Concurrently m a #

(Eq k, Hashable k) => Semigroup (HashMap k v)

<> = union

If a key occurs in both maps, the mapping from the first will be the mapping in the result.

Examples

Expand
>>> fromList [(1,'a'),(2,'b')] <> fromList [(2,'c'),(3,'d')]
fromList [(1,'a'),(2,'b'),(3,'d')]
Instance details

Defined in Data.HashMap.Internal

Methods

(<>) :: HashMap k v -> HashMap k v -> HashMap k v #

sconcat :: NonEmpty (HashMap k v) -> HashMap k v #

stimes :: Integral b => b -> HashMap k v -> HashMap k v #

a ~ () => Semigroup (WidgetFor site a) 
Instance details

Defined in Yesod.Core.Types

Methods

(<>) :: WidgetFor site a -> WidgetFor site a -> WidgetFor site a #

sconcat :: NonEmpty (WidgetFor site a) -> WidgetFor site a #

stimes :: Integral b => b -> WidgetFor site a -> WidgetFor site a #

(Monad m, Semigroup a) => Semigroup (AForm m a) 
Instance details

Defined in Yesod.Form.Types

Methods

(<>) :: AForm m a -> AForm m a -> AForm m a #

sconcat :: NonEmpty (AForm m a) -> AForm m a #

stimes :: Integral b => b -> AForm m a -> AForm m 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 b) => Semigroup (a, b)

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

(<>) :: (a, b) -> (a, b) -> (a, b) #

sconcat :: NonEmpty (a, b) -> (a, b) #

stimes :: Integral b0 => b0 -> (a, b) -> (a, b) #

Semigroup a => Semigroup (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

(<>) :: Const a b -> Const a b -> Const a b #

sconcat :: NonEmpty (Const a b) -> Const a b #

stimes :: Integral b0 => b0 -> Const a b -> Const a b #

(Applicative f, Semigroup a) => Semigroup (Ap f a)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

(<>) :: Ap f a -> Ap f a -> Ap f a #

sconcat :: NonEmpty (Ap f a) -> Ap f a #

stimes :: Integral b => b -> Ap f a -> Ap f a #

Alternative f => Semigroup (Alt f a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

(<>) :: Alt f a -> Alt f a -> Alt f a #

sconcat :: NonEmpty (Alt f a) -> Alt f a #

stimes :: Integral b => b -> Alt f a -> Alt f a #

Semigroup (f p) => Semigroup (Rec1 f p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

(<>) :: Rec1 f p -> Rec1 f p -> Rec1 f p #

sconcat :: NonEmpty (Rec1 f p) -> Rec1 f p #

stimes :: Integral b => b -> Rec1 f p -> Rec1 f p #

(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 a => Semigroup (Constant a b) 
Instance details

Defined in Data.Functor.Constant

Methods

(<>) :: Constant a b -> Constant a b -> Constant a b #

sconcat :: NonEmpty (Constant a b) -> Constant a b #

stimes :: Integral b0 => b0 -> Constant a b -> Constant a b #

(Semigroup a, Semigroup b, Semigroup c) => Semigroup (a, b, c)

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

(<>) :: (a, b, c) -> (a, b, c) -> (a, b, c) #

sconcat :: NonEmpty (a, b, c) -> (a, b, c) #

stimes :: Integral b0 => b0 -> (a, b, c) -> (a, b, c) #

(Semigroup (f p), Semigroup (g p)) => Semigroup ((f :*: g) p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

(<>) :: (f :*: g) p -> (f :*: g) p -> (f :*: g) p #

sconcat :: NonEmpty ((f :*: g) p) -> (f :*: g) p #

stimes :: Integral b => b -> (f :*: g) p -> (f :*: g) p #

Semigroup c => Semigroup (K1 i c p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

(<>) :: K1 i c p -> K1 i c p -> K1 i c p #

sconcat :: NonEmpty (K1 i c p) -> K1 i c p #

stimes :: Integral b => b -> K1 i c p -> K1 i c p #

Monad m => Semigroup (ConduitT i o m ()) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

(<>) :: ConduitT i o m () -> ConduitT i o m () -> ConduitT i o m () #

sconcat :: NonEmpty (ConduitT i o m ()) -> ConduitT i o m () #

stimes :: Integral b => b -> ConduitT i o m () -> ConduitT i o m () #

(Semigroup a, Semigroup b, Semigroup c, Semigroup d) => Semigroup (a, b, c, d)

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

(<>) :: (a, b, c, d) -> (a, b, c, d) -> (a, b, c, d) #

sconcat :: NonEmpty (a, b, c, d) -> (a, b, c, d) #

stimes :: Integral b0 => b0 -> (a, b, c, d) -> (a, b, c, d) #

Semigroup (f (g p)) => Semigroup ((f :.: g) p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

(<>) :: (f :.: g) p -> (f :.: g) p -> (f :.: g) p #

sconcat :: NonEmpty ((f :.: g) p) -> (f :.: g) p #

stimes :: Integral b => b -> (f :.: g) p -> (f :.: g) p #

Semigroup (f p) => Semigroup (M1 i c f p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

(<>) :: M1 i c f p -> M1 i c f p -> M1 i c f p #

sconcat :: NonEmpty (M1 i c f p) -> M1 i c f p #

stimes :: Integral b => b -> M1 i c f p -> M1 i c f p #

(Semigroup a, Semigroup b, Semigroup c, Semigroup d, Semigroup e) => Semigroup (a, b, c, d, e)

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

(<>) :: (a, b, c, d, e) -> (a, b, c, d, e) -> (a, b, c, d, e) #

sconcat :: NonEmpty (a, b, c, d, e) -> (a, b, c, d, e) #

stimes :: Integral b0 => b0 -> (a, b, c, d, e) -> (a, b, c, d, e) #

Monad m => Semigroup (Pipe l i o u m ()) 
Instance details

Defined in Data.Conduit.Internal.Pipe

Methods

(<>) :: Pipe l i o u m () -> Pipe l i o u m () -> Pipe l i o u m () #

sconcat :: NonEmpty (Pipe l i o u m ()) -> Pipe l i o u m () #

stimes :: Integral b => b -> Pipe l i o u m () -> Pipe l i o u m () #

class Semigroup a => Monoid a where #

The class of monoids (types with an associative binary operation that has an identity). Instances should satisfy the following:

Right identity
x <> mempty = x
Left identity
mempty <> x = x
Associativity
x <> (y <> z) = (x <> y) <> z (Semigroup law)
Concatenation
mconcat = foldr (<>) mempty

The method names refer to the monoid of lists under concatenation, but there are many other instances.

Some types can be viewed as a monoid in more than one way, e.g. both addition and multiplication on numbers. In such cases we often define newtypes and make those instances of Monoid, e.g. Sum and Product.

NOTE: Semigroup is a superclass of Monoid since base-4.11.0.0.

Minimal complete definition

mempty

Methods

mempty :: a #

Identity of mappend

>>> "Hello world" <> mempty
"Hello world"

mappend :: a -> a -> a #

An associative operation

NOTE: This method is redundant and has the default implementation mappend = (<>) since base-4.11.0.0. Should it be implemented manually, since mappend is a synonym for (<>), it is expected that the two functions are defined the same way. In a future GHC release mappend will be removed from Monoid.

mconcat :: [a] -> a #

Fold a list using the monoid.

For most types, the default definition for mconcat will be used, but the function is included in the class definition so that an optimized version can be provided for specific types.

>>> mconcat ["Hello", " ", "Haskell", "!"]
"Hello Haskell!"

Instances

Instances details
Monoid Series 
Instance details

Defined in Data.Aeson.Encoding.Internal

Monoid More 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

mempty :: More #

mappend :: More -> More -> More #

mconcat :: [More] -> More #

Monoid All

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

mempty :: All #

mappend :: All -> All -> All #

mconcat :: [All] -> All #

Monoid Any

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

mempty :: Any #

mappend :: Any -> Any -> Any #

mconcat :: [Any] -> Any #

Monoid String 
Instance details

Defined in Basement.UTF8.Base

Monoid Attribute 
Instance details

Defined in Text.Blaze.Internal

Monoid AttributeValue 
Instance details

Defined in Text.Blaze.Internal

Monoid ChoiceString 
Instance details

Defined in Text.Blaze.Internal

Monoid HtmlClassAttr Source # 
Instance details

Defined in BtcLsp.Yesod.Data.Widget

Monoid Bytes 
Instance details

Defined in Data.Bytes.Internal

Methods

mempty :: Bytes #

mappend :: Bytes -> Bytes -> Bytes #

mconcat :: [Bytes] -> Bytes #

Monoid Builder 
Instance details

Defined in Data.ByteString.Builder.Internal

Monoid ByteString 
Instance details

Defined in Data.ByteString.Internal

Monoid ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Monoid ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Monoid Timespan 
Instance details

Defined in Chronos

Monoid IntSet 
Instance details

Defined in Data.IntSet.Internal

Monoid DistinctClause 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Monoid GroupByClause 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Monoid LimitClause 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Monoid SideData 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Monoid WhereClause 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Monoid LogStr 
Instance details

Defined in System.Log.FastLogger.LogStr

Monoid Ordering

Since: base-2.1

Instance details

Defined in GHC.Base

Monoid CookieJar

Since 1.9

Instance details

Defined in Network.HTTP.Client.Types

Monoid RequestBody 
Instance details

Defined in Network.HTTP.Client.Types

Monoid LogStr 
Instance details

Defined in Katip.Core

Monoid Namespace 
Instance details

Defined in Katip.Core

Monoid PayloadSelection 
Instance details

Defined in Katip.Core

Monoid Scribe 
Instance details

Defined in Katip.Core

Monoid SimpleLogPayload 
Instance details

Defined in Katip.Core

Monoid LogContexts 
Instance details

Defined in Katip.Monadic

Monoid EntityConstraintDefs 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

mempty :: EntityConstraintDefs #

mappend :: EntityConstraintDefs -> EntityConstraintDefs -> EntityConstraintDefs #

mconcat :: [EntityConstraintDefs] -> EntityConstraintDefs #

Monoid Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Methods

mempty :: Doc #

mappend :: Doc -> Doc -> Doc #

mconcat :: [Doc] -> Doc #

Monoid AnsiStyle

mempty does nothing, which is equivalent to inheriting the style of the surrounding doc, or the terminal’s default if no style has been set yet.

Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Monoid ByteArray 
Instance details

Defined in Data.Primitive.ByteArray

Monoid Registry 
Instance details

Defined in Data.ProtoLens.Message

Methods

mempty :: Registry #

mappend :: Registry -> Registry -> Registry #

mconcat :: [Registry] -> Registry #

Monoid Mixin 
Instance details

Defined in Text.Internal.Css

Methods

mempty :: Mixin #

mappend :: Mixin -> Mixin -> Mixin #

mconcat :: [Mixin] -> Mixin #

Monoid Javascript 
Instance details

Defined in Text.Julius

Monoid Builder 
Instance details

Defined in Data.Text.Internal.Builder

Monoid ShortText 
Instance details

Defined in Data.Text.Short.Internal

Monoid LiteApp 
Instance details

Defined in Yesod.Core.Internal.LiteApp

Monoid Enctype 
Instance details

Defined in Yesod.Form.Types

Monoid ()

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

mempty :: () #

mappend :: () -> () -> () #

mconcat :: [()] -> () #

Monoid (IResult a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

mempty :: IResult a #

mappend :: IResult a -> IResult a -> IResult a #

mconcat :: [IResult a] -> IResult a #

Monoid (Parser a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

mempty :: Parser a #

mappend :: Parser a -> Parser a -> Parser a #

mconcat :: [Parser a] -> Parser a #

Monoid (Result a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

mempty :: Result a #

mappend :: Result a -> Result a -> Result a #

mconcat :: [Result a] -> Result a #

(Semigroup a, Monoid a) => Monoid (Concurrently a)

Since: async-2.1.0

Instance details

Defined in Control.Concurrent.Async

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 (Down a)

Since: base-4.11.0.0

Instance details

Defined in Data.Ord

Methods

mempty :: Down a #

mappend :: Down a -> Down a -> Down a #

mconcat :: [Down a] -> Down a #

(Ord a, Bounded a) => Monoid (Max a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

mempty :: Max a #

mappend :: Max a -> Max a -> Max a #

mconcat :: [Max a] -> Max a #

(Ord a, Bounded a) => Monoid (Min a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

mempty :: Min a #

mappend :: Min a -> Min a -> Min a #

mconcat :: [Min a] -> Min a #

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 m => Monoid (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Monoid a => Monoid (Dual a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

mempty :: Dual a #

mappend :: Dual a -> Dual a -> Dual a #

mconcat :: [Dual a] -> Dual a #

Monoid (Endo a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

mempty :: Endo a #

mappend :: Endo a -> Endo a -> Endo a #

mconcat :: [Endo a] -> Endo a #

Num a => Monoid (Product a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

mempty :: Product a #

mappend :: Product a -> Product a -> Product a #

mconcat :: [Product a] -> Product a #

Num a => Monoid (Sum a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

mempty :: Sum a #

mappend :: Sum a -> Sum a -> Sum a #

mconcat :: [Sum a] -> Sum a #

Monoid p => Monoid (Par1 p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

mempty :: Par1 p #

mappend :: Par1 p -> Par1 p -> Par1 p #

mconcat :: [Par1 p] -> Par1 p #

PrimType ty => Monoid (Block ty) 
Instance details

Defined in Basement.Block.Base

Methods

mempty :: Block ty #

mappend :: Block ty -> Block ty -> Block ty #

mconcat :: [Block ty] -> Block ty #

Monoid (CountOf ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

mempty :: CountOf ty #

mappend :: CountOf ty -> CountOf ty -> CountOf ty #

mconcat :: [CountOf ty] -> CountOf ty #

PrimType ty => Monoid (UArray ty) 
Instance details

Defined in Basement.UArray.Base

Methods

mempty :: UArray ty #

mappend :: UArray ty -> UArray ty -> UArray ty #

mconcat :: [UArray ty] -> UArray ty #

Monoid a => Monoid (MarkupM a) 
Instance details

Defined in Text.Blaze.Internal

Methods

mempty :: MarkupM a #

mappend :: MarkupM a -> MarkupM a -> MarkupM a #

mconcat :: [MarkupM a] -> MarkupM 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 #

Monoid (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

mempty :: IntMap a #

mappend :: IntMap a -> IntMap a -> IntMap a #

mconcat :: [IntMap a] -> IntMap a #

Monoid (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

mempty :: Seq a #

mappend :: Seq a -> Seq a -> Seq a #

mconcat :: [Seq a] -> Seq a #

Monoid (MergeSet a) 
Instance details

Defined in Data.Set.Internal

Methods

mempty :: MergeSet a #

mappend :: MergeSet a -> MergeSet a -> MergeSet a #

mconcat :: [MergeSet a] -> MergeSet a #

Ord a => Monoid (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

mempty :: Set a #

mappend :: Set a -> Set a -> Set a #

mconcat :: [Set a] -> Set a #

Monoid (DList a) 
Instance details

Defined in Data.DList.Internal

Methods

mempty :: DList a #

mappend :: DList a -> DList a -> DList a #

mconcat :: [DList a] -> DList a #

Monoid a => Monoid (IO a)

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

mempty :: IO a #

mappend :: IO a -> IO a -> IO a #

mconcat :: [IO a] -> IO a #

Monoid (First a) 
Instance details

Defined in Lens.Family

Methods

mempty :: First a #

mappend :: First a -> First a -> First a #

mconcat :: [First a] -> First a #

Monoid (Last a) 
Instance details

Defined in Lens.Family

Methods

mempty :: Last a #

mappend :: Last a -> Last a -> Last a #

mconcat :: [Last a] -> Last 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 (SetOnceAtMost a) 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

mempty :: SetOnceAtMost a #

mappend :: SetOnceAtMost a -> SetOnceAtMost a -> SetOnceAtMost a #

mconcat :: [SetOnceAtMost a] -> SetOnceAtMost 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 (Doc ann)
mempty = emptyDoc
mconcat = hcat
>>> mappend "hello" "world" :: Doc ann
helloworld
Instance details

Defined in Prettyprinter.Internal

Methods

mempty :: Doc ann #

mappend :: Doc ann -> Doc ann -> Doc ann #

mconcat :: [Doc ann] -> Doc ann #

Monoid (Array a) 
Instance details

Defined in Data.Primitive.Array

Methods

mempty :: Array a #

mappend :: Array a -> Array a -> Array a #

mconcat :: [Array a] -> Array a #

Monoid (PrimArray a)

Since: primitive-0.6.4.0

Instance details

Defined in Data.Primitive.PrimArray

Monoid (SmallArray a) 
Instance details

Defined in Data.Primitive.SmallArray

PrimUnlifted a => Monoid (UnliftedArray a) 
Instance details

Defined in Data.Primitive.Unlifted.Array

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 #

Semigroup a => Monoid (Maybe a) 
Instance details

Defined in Data.Strict.Maybe

Methods

mempty :: Maybe a #

mappend :: Maybe a -> Maybe a -> Maybe a #

mconcat :: [Maybe a] -> Maybe a #

Monoid a => Monoid (Q a)

Since: template-haskell-2.17.0.0

Instance details

Defined in Language.Haskell.TH.Syntax

Methods

mempty :: Q a #

mappend :: Q a -> Q a -> Q a #

mconcat :: [Q a] -> Q a #

(Hashable a, Eq a) => Monoid (HashSet a)

mempty = empty

mappend = union

O(n+m)

To obtain good performance, the smaller set must be presented as the first argument.

Examples

Expand
>>> mappend (fromList [1,2]) (fromList [2,3])
fromList [1,2,3]
Instance details

Defined in Data.HashSet.Internal

Methods

mempty :: HashSet a #

mappend :: HashSet a -> HashSet a -> HashSet a #

mconcat :: [HashSet a] -> HashSet a #

Monoid (Vault s) 
Instance details

Defined in Data.Vault.ST.Lazy

Methods

mempty :: Vault s #

mappend :: Vault s -> Vault s -> Vault s #

mconcat :: [Vault s] -> Vault s #

Monoid (Vector a) 
Instance details

Defined in Data.Vector

Methods

mempty :: Vector a #

mappend :: Vector a -> Vector a -> Vector a #

mconcat :: [Vector a] -> Vector a #

Prim a => Monoid (Vector a) 
Instance details

Defined in Data.Vector.Primitive

Methods

mempty :: Vector a #

mappend :: Vector a -> Vector a -> Vector a #

mconcat :: [Vector a] -> Vector a #

Storable a => Monoid (Vector a) 
Instance details

Defined in Data.Vector.Storable

Methods

mempty :: Vector a #

mappend :: Vector a -> Vector a -> Vector a #

mconcat :: [Vector a] -> Vector a #

Monoid (Body url) 
Instance details

Defined in Yesod.Core.Types

Methods

mempty :: Body url #

mappend :: Body url -> Body url -> Body url #

mconcat :: [Body url] -> Body url #

Monoid (GWData a) 
Instance details

Defined in Yesod.Core.Types

Methods

mempty :: GWData a #

mappend :: GWData a -> GWData a -> GWData a #

mconcat :: [GWData a] -> GWData a #

Monoid (Head url) 
Instance details

Defined in Yesod.Core.Types

Methods

mempty :: Head url #

mappend :: Head url -> Head url -> Head url #

mconcat :: [Head url] -> Head url #

Monoid (UniqueList x) 
Instance details

Defined in Yesod.Core.Types

Monoid m => Monoid (FormResult m) 
Instance details

Defined in Yesod.Form.Types

Semigroup a => Monoid (Maybe a)

Lift a semigroup into Maybe forming a Monoid according to http://en.wikipedia.org/wiki/Monoid: "Any semigroup S may be turned into a monoid simply by adjoining an element e not in S and defining e*e = e and e*s = s = s*e for all s ∈ S."

Since 4.11.0: constraint on inner a value generalised from Monoid to Semigroup.

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

mempty :: Maybe a #

mappend :: Maybe a -> Maybe a -> Maybe a #

mconcat :: [Maybe a] -> Maybe a #

Monoid a => Monoid (a)

Since: base-4.15

Instance details

Defined in GHC.Base

Methods

mempty :: (a) #

mappend :: (a) -> (a) -> (a) #

mconcat :: [(a)] -> (a) #

Monoid [a]

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

mempty :: [a] #

mappend :: [a] -> [a] -> [a] #

mconcat :: [[a]] -> [a] #

Monoid (Parser i a) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

mempty :: Parser i a #

mappend :: Parser i a -> Parser i a -> Parser i a #

mconcat :: [Parser i a] -> Parser i a #

Monoid (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

mempty :: Proxy s #

mappend :: Proxy s -> Proxy s -> Proxy s #

mconcat :: [Proxy s] -> Proxy s #

Monoid (U1 p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

mempty :: U1 p #

mappend :: U1 p -> U1 p -> U1 p #

mconcat :: [U1 p] -> U1 p #

Monoid a => Monoid (ST s a)

Since: base-4.11.0.0

Instance details

Defined in GHC.ST

Methods

mempty :: ST s a #

mappend :: ST s a -> ST s a -> ST s a #

mconcat :: [ST s a] -> ST s a #

Ord k => Monoid (Map k v) 
Instance details

Defined in Data.Map.Internal

Methods

mempty :: Map k v #

mappend :: Map k v -> Map k v -> Map k v #

mconcat :: [Map k v] -> Map k v #

Monoid (Mod t a) 
Instance details

Defined in Env.Internal.Parser

Methods

mempty :: Mod t a #

mappend :: Mod t a -> Mod t a -> Mod t a #

mconcat :: [Mod t a] -> Mod t a #

(Monoid e, Monoid r) => Monoid (AllE e r) 
Instance details

Defined in Control.Error.Util

Methods

mempty :: AllE e r #

mappend :: AllE e r -> AllE e r -> AllE e r #

mconcat :: [AllE e r] -> AllE e r #

(Monoid e, Monoid r) => Monoid (AnyE e r) 
Instance details

Defined in Control.Error.Util

Methods

mempty :: AnyE e r #

mappend :: AnyE e r -> AnyE e r -> AnyE e r #

mconcat :: [AnyE e r] -> AnyE e r #

Applicative f => Monoid (Traversed a f) 
Instance details

Defined in Lens.Micro

Methods

mempty :: Traversed a f #

mappend :: Traversed a f -> Traversed a f -> Traversed a f #

mconcat :: [Traversed a f] -> Traversed a f #

Monoid a => Monoid (Err e a) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

mempty :: Err e a #

mappend :: Err e a -> Err e a -> Err e a #

mconcat :: [Err e a] -> Err e a #

(Monoid a, Monoid b) => Monoid (Pair a b) 
Instance details

Defined in Data.Strict.Tuple

Methods

mempty :: Pair a b #

mappend :: Pair a b -> Pair a b -> Pair a b #

mconcat :: [Pair a b] -> Pair a b #

(Monoid a, MonadUnliftIO m) => Monoid (Conc m a)

Since: unliftio-0.2.9.0

Instance details

Defined in UnliftIO.Internals.Async

Methods

mempty :: Conc m a #

mappend :: Conc m a -> Conc m a -> Conc m a #

mconcat :: [Conc m a] -> Conc m a #

(Semigroup a, Monoid a, MonadUnliftIO m) => Monoid (Concurrently m a)

Since: unliftio-0.1.0.0

Instance details

Defined in UnliftIO.Internals.Async

(Eq k, Hashable k) => Monoid (HashMap k v)

mempty = empty

mappend = union

If a key occurs in both maps, the mapping from the first will be the mapping in the result.

Examples

Expand
>>> mappend (fromList [(1,'a'),(2,'b')]) (fromList [(2,'c'),(3,'d')])
fromList [(1,'a'),(2,'b'),(3,'d')]
Instance details

Defined in Data.HashMap.Internal

Methods

mempty :: HashMap k v #

mappend :: HashMap k v -> HashMap k v -> HashMap k v #

mconcat :: [HashMap k v] -> HashMap k v #

a ~ () => Monoid (WidgetFor site a) 
Instance details

Defined in Yesod.Core.Types

Methods

mempty :: WidgetFor site a #

mappend :: WidgetFor site a -> WidgetFor site a -> WidgetFor site a #

mconcat :: [WidgetFor site a] -> WidgetFor site a #

(Monad m, Monoid a) => Monoid (AForm m a) 
Instance details

Defined in Yesod.Form.Types

Methods

mempty :: AForm m a #

mappend :: AForm m a -> AForm m a -> AForm m a #

mconcat :: [AForm m a] -> AForm m 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 b) => Monoid (a, b)

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

mempty :: (a, b) #

mappend :: (a, b) -> (a, b) -> (a, b) #

mconcat :: [(a, b)] -> (a, b) #

Monoid a => Monoid (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

mempty :: Const a b #

mappend :: Const a b -> Const a b -> Const a b #

mconcat :: [Const a b] -> Const a b #

(Applicative f, Monoid a) => Monoid (Ap f a)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

mempty :: Ap f a #

mappend :: Ap f a -> Ap f a -> Ap f a #

mconcat :: [Ap f a] -> Ap f a #

Alternative f => Monoid (Alt f a)

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

mempty :: Alt f a #

mappend :: Alt f a -> Alt f a -> Alt f a #

mconcat :: [Alt f a] -> Alt f a #

Monoid (f p) => Monoid (Rec1 f p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

mempty :: Rec1 f p #

mappend :: Rec1 f p -> Rec1 f p -> Rec1 f p #

mconcat :: [Rec1 f p] -> Rec1 f p #

(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 a => Monoid (Constant a b) 
Instance details

Defined in Data.Functor.Constant

Methods

mempty :: Constant a b #

mappend :: Constant a b -> Constant a b -> Constant a b #

mconcat :: [Constant a b] -> Constant a b #

(Monoid a, Monoid b, Monoid c) => Monoid (a, b, c)

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

mempty :: (a, b, c) #

mappend :: (a, b, c) -> (a, b, c) -> (a, b, c) #

mconcat :: [(a, b, c)] -> (a, b, c) #

(Monoid (f p), Monoid (g p)) => Monoid ((f :*: g) p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

mempty :: (f :*: g) p #

mappend :: (f :*: g) p -> (f :*: g) p -> (f :*: g) p #

mconcat :: [(f :*: g) p] -> (f :*: g) p #

Monoid c => Monoid (K1 i c p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

mempty :: K1 i c p #

mappend :: K1 i c p -> K1 i c p -> K1 i c p #

mconcat :: [K1 i c p] -> K1 i c p #

Monad m => Monoid (ConduitT i o m ()) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

mempty :: ConduitT i o m () #

mappend :: ConduitT i o m () -> ConduitT i o m () -> ConduitT i o m () #

mconcat :: [ConduitT i o m ()] -> ConduitT i o m () #

(Monoid a, Monoid b, Monoid c, Monoid d) => Monoid (a, b, c, d)

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

mempty :: (a, b, c, d) #

mappend :: (a, b, c, d) -> (a, b, c, d) -> (a, b, c, d) #

mconcat :: [(a, b, c, d)] -> (a, b, c, d) #

Monoid (f (g p)) => Monoid ((f :.: g) p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

mempty :: (f :.: g) p #

mappend :: (f :.: g) p -> (f :.: g) p -> (f :.: g) p #

mconcat :: [(f :.: g) p] -> (f :.: g) p #

Monoid (f p) => Monoid (M1 i c f p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

mempty :: M1 i c f p #

mappend :: M1 i c f p -> M1 i c f p -> M1 i c f p #

mconcat :: [M1 i c f p] -> M1 i c f p #

(Monoid a, Monoid b, Monoid c, Monoid d, Monoid e) => Monoid (a, b, c, d, e)

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

mempty :: (a, b, c, d, e) #

mappend :: (a, b, c, d, e) -> (a, b, c, d, e) -> (a, b, c, d, e) #

mconcat :: [(a, b, c, d, e)] -> (a, b, c, d, e) #

Monad m => Monoid (Pipe l i o u m ()) 
Instance details

Defined in Data.Conduit.Internal.Pipe

Methods

mempty :: Pipe l i o u m () #

mappend :: Pipe l i o u m () -> Pipe l i o u m () -> Pipe l i o u m () #

mconcat :: [Pipe l i o u m ()] -> Pipe l i o u m () #

data Bool #

Constructors

False 
True 

Instances

Instances details
Out Bool 
Instance details

Defined in Text.PrettyPrint.GenericPretty

Methods

docPrec :: Int -> Bool -> Doc #

doc :: Bool -> Doc #

docList :: [Bool] -> Doc #

FromJSON Bool 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Bool 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Bool 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Bool 
Instance details

Defined in Data.Aeson.Types.ToJSON

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

Storable Bool

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Bool -> Int #

alignment :: Bool -> Int #

peekElemOff :: Ptr Bool -> Int -> IO Bool #

pokeElemOff :: Ptr Bool -> Int -> Bool -> IO () #

peekByteOff :: Ptr b -> Int -> IO Bool #

pokeByteOff :: Ptr b -> Int -> Bool -> IO () #

peek :: Ptr Bool -> IO Bool #

poke :: Ptr Bool -> Bool -> IO () #

Bounded Bool

Since: base-2.1

Instance details

Defined in GHC.Enum

Enum Bool

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

succ :: Bool -> Bool #

pred :: Bool -> Bool #

toEnum :: Int -> Bool #

fromEnum :: Bool -> Int #

enumFrom :: Bool -> [Bool] #

enumFromThen :: Bool -> Bool -> [Bool] #

enumFromTo :: Bool -> Bool -> [Bool] #

enumFromThenTo :: Bool -> Bool -> Bool -> [Bool] #

Generic Bool 
Instance details

Defined in GHC.Generics

Associated Types

type Rep Bool :: Type -> Type #

Methods

from :: Bool -> Rep Bool x #

to :: Rep Bool x -> Bool #

SingKind Bool

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Associated Types

type DemoteRep Bool

Methods

fromSing :: forall (a :: Bool). Sing a -> DemoteRep Bool

Read Bool

Since: base-2.1

Instance details

Defined in GHC.Read

Show Bool

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Bool -> ShowS #

show :: Bool -> String #

showList :: [Bool] -> ShowS #

BitOps Bool 
Instance details

Defined in Basement.Bits

FiniteBitsOps Bool 
Instance details

Defined in Basement.Bits

ToMarkup Bool 
Instance details

Defined in Text.Blaze

ToValue Bool 
Instance details

Defined in Text.Blaze

NFData Bool 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Bool -> () #

Eq Bool 
Instance details

Defined in GHC.Classes

Methods

(==) :: Bool -> Bool -> Bool #

(/=) :: Bool -> Bool -> Bool #

Ord Bool 
Instance details

Defined in GHC.Classes

Methods

compare :: Bool -> Bool -> Ordering #

(<) :: Bool -> Bool -> Bool #

(<=) :: Bool -> Bool -> Bool #

(>) :: Bool -> Bool -> Bool #

(>=) :: Bool -> Bool -> Bool #

max :: Bool -> Bool -> Bool #

min :: Bool -> Bool -> Bool #

Hashable Bool 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Bool -> Int #

hash :: Bool -> Int #

FromHttpApiData Bool 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Bool 
Instance details

Defined in Web.Internal.HttpApiData

PathPiece Bool 
Instance details

Defined in Web.PathPieces

PersistField Bool 
Instance details

Defined in Database.Persist.Class.PersistField

PersistFieldSql Bool 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Bool -> SqlType #

Pretty Bool
>>> pretty True
True
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Bool -> Doc ann #

prettyList :: [Bool] -> Doc ann #

FieldDefault Bool 
Instance details

Defined in Data.ProtoLens.Message

Methods

fieldDefault :: Bool

Uniform Bool 
Instance details

Defined in System.Random.Internal

Methods

uniformM :: StatefulGen g m => g -> m Bool #

UniformRange Bool 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Bool, Bool) -> g -> m Bool #

RawJS Bool 
Instance details

Defined in Text.Julius

Methods

rawJS :: Bool -> RawJavascript #

ToJavascript Bool 
Instance details

Defined in Text.Julius

Unbox Bool 
Instance details

Defined in Data.Vector.Unboxed.Base

SingI 'False

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

sing :: Sing 'False

SingI 'True

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

sing :: Sing 'True

Lift Bool 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Bool -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Bool -> Code m Bool #

Vector Vector Bool 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Bool 
Instance details

Defined in Data.Vector.Unboxed.Base

HasField InternalFailure "redacted" Bool 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

fieldOf :: Functor f => Proxy# "redacted" -> (Bool -> f Bool) -> InternalFailure -> f InternalFailure

HasField AddHoldInvoiceRequest "private" Bool 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

fieldOf :: Functor f => Proxy# "private" -> (Bool -> f Bool) -> AddHoldInvoiceRequest -> f AddHoldInvoiceRequest

HasField BatchOpenChannel "private" Bool 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "private" -> (Bool -> f Bool) -> BatchOpenChannel -> f BatchOpenChannel

HasField BatchOpenChannelRequest "spendUnconfirmed" Bool 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "spendUnconfirmed" -> (Bool -> f Bool) -> BatchOpenChannelRequest -> f BatchOpenChannelRequest

HasField ChannelAcceptResponse "accept" Bool 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "accept" -> (Bool -> f Bool) -> ChannelAcceptResponse -> f ChannelAcceptResponse

HasField ChannelCloseUpdate "success" Bool 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "success" -> (Bool -> f Bool) -> ChannelCloseUpdate -> f ChannelCloseUpdate

HasField CloseChannelRequest "force" Bool 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "force" -> (Bool -> f Bool) -> CloseChannelRequest -> f CloseChannelRequest

HasField ClosedChannelsRequest "abandoned" Bool 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "abandoned" -> (Bool -> f Bool) -> ClosedChannelsRequest -> f ClosedChannelsRequest

HasField ClosedChannelsRequest "breach" Bool 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "breach" -> (Bool -> f Bool) -> ClosedChannelsRequest -> f ClosedChannelsRequest

HasField ClosedChannelsRequest "cooperative" Bool 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "cooperative" -> (Bool -> f Bool) -> ClosedChannelsRequest -> f ClosedChannelsRequest

HasField ClosedChannelsRequest "fundingCanceled" Bool 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "fundingCanceled" -> (Bool -> f Bool) -> ClosedChannelsRequest -> f ClosedChannelsRequest

HasField ClosedChannelsRequest "localForce" Bool 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "localForce" -> (Bool -> f Bool) -> ClosedChannelsRequest -> f ClosedChannelsRequest

HasField ClosedChannelsRequest "remoteForce" Bool 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "remoteForce" -> (Bool -> f Bool) -> ClosedChannelsRequest -> f ClosedChannelsRequest

HasField ConnectPeerRequest "perm" Bool 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "perm" -> (Bool -> f Bool) -> ConnectPeerRequest -> f ConnectPeerRequest

HasField EstimateFeeRequest "spendUnconfirmed" Bool 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "spendUnconfirmed" -> (Bool -> f Bool) -> EstimateFeeRequest -> f EstimateFeeRequest

HasField GetInfoResponse "syncedToChain" Bool 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "syncedToChain" -> (Bool -> f Bool) -> GetInfoResponse -> f GetInfoResponse

HasField GetInfoResponse "syncedToGraph" Bool 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "syncedToGraph" -> (Bool -> f Bool) -> GetInfoResponse -> f GetInfoResponse

HasField GetInfoResponse "testnet" Bool 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "testnet" -> (Bool -> f Bool) -> GetInfoResponse -> f GetInfoResponse

HasField GetRecoveryInfoResponse "recoveryFinished" Bool 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "recoveryFinished" -> (Bool -> f Bool) -> GetRecoveryInfoResponse -> f GetRecoveryInfoResponse

HasField GetRecoveryInfoResponse "recoveryMode" Bool 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "recoveryMode" -> (Bool -> f Bool) -> GetRecoveryInfoResponse -> f GetRecoveryInfoResponse

HasField ListChannelsRequest "activeOnly" Bool 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "activeOnly" -> (Bool -> f Bool) -> ListChannelsRequest -> f ListChannelsRequest

HasField ListChannelsRequest "inactiveOnly" Bool 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "inactiveOnly" -> (Bool -> f Bool) -> ListChannelsRequest -> f ListChannelsRequest

HasField ListChannelsRequest "privateOnly" Bool 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "privateOnly" -> (Bool -> f Bool) -> ListChannelsRequest -> f ListChannelsRequest

HasField ListChannelsRequest "publicOnly" Bool 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "publicOnly" -> (Bool -> f Bool) -> ListChannelsRequest -> f ListChannelsRequest

HasField ListPeersRequest "latestError" Bool 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "latestError" -> (Bool -> f Bool) -> ListPeersRequest -> f ListPeersRequest

HasField OpenChannelRequest "private" Bool 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "private" -> (Bool -> f Bool) -> OpenChannelRequest -> f OpenChannelRequest

HasField OpenChannelRequest "spendUnconfirmed" Bool 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "spendUnconfirmed" -> (Bool -> f Bool) -> OpenChannelRequest -> f OpenChannelRequest

HasField Peer "inbound" Bool 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "inbound" -> (Bool -> f Bool) -> Peer -> f Peer

HasField SendCoinsRequest "sendAll" Bool 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "sendAll" -> (Bool -> f Bool) -> SendCoinsRequest -> f SendCoinsRequest

HasField SendCoinsRequest "spendUnconfirmed" Bool 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "spendUnconfirmed" -> (Bool -> f Bool) -> SendCoinsRequest -> f SendCoinsRequest

HasField SendManyRequest "spendUnconfirmed" Bool 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "spendUnconfirmed" -> (Bool -> f Bool) -> SendManyRequest -> f SendManyRequest

HasField SendRequest "allowSelfPayment" Bool 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "allowSelfPayment" -> (Bool -> f Bool) -> SendRequest -> f SendRequest

HasField SignMessageRequest "singleHash" Bool 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "singleHash" -> (Bool -> f Bool) -> SignMessageRequest -> f SignMessageRequest

HasField VerifyMessageResponse "valid" Bool 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "valid" -> (Bool -> f Bool) -> VerifyMessageResponse -> f VerifyMessageResponse

HasField Channel "active" Bool 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "active" -> (Bool -> f Bool) -> Channel -> f Channel

HasField Channel "initiator" Bool 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "initiator" -> (Bool -> f Bool) -> Channel -> f Channel

HasField Channel "private" Bool 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "private" -> (Bool -> f Bool) -> Channel -> f Channel

HasField Channel "staticRemoteKey" Bool 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "staticRemoteKey" -> (Bool -> f Bool) -> Channel -> f Channel

HasField ChannelGraphRequest "includeUnannounced" Bool 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "includeUnannounced" -> (Bool -> f Bool) -> ChannelGraphRequest -> f ChannelGraphRequest

HasField EdgeLocator "directionReverse" Bool 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "directionReverse" -> (Bool -> f Bool) -> EdgeLocator -> f EdgeLocator

HasField Feature "isKnown" Bool 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "isKnown" -> (Bool -> f Bool) -> Feature -> f Feature

HasField Feature "isRequired" Bool 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "isRequired" -> (Bool -> f Bool) -> Feature -> f Feature

HasField FundingPsbtVerify "skipFinalize" Bool 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "skipFinalize" -> (Bool -> f Bool) -> FundingPsbtVerify -> f FundingPsbtVerify

HasField HTLC "incoming" Bool 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "incoming" -> (Bool -> f Bool) -> HTLC -> f HTLC

HasField Hop "tlvPayload" Bool 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "tlvPayload" -> (Bool -> f Bool) -> Hop -> f Hop

HasField NodeInfoRequest "includeChannels" Bool 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "includeChannels" -> (Bool -> f Bool) -> NodeInfoRequest -> f NodeInfoRequest

HasField PendingHTLC "incoming" Bool 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "incoming" -> (Bool -> f Bool) -> PendingHTLC -> f PendingHTLC

HasField PsbtShim "noPublish" Bool 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "noPublish" -> (Bool -> f Bool) -> PsbtShim -> f PsbtShim

HasField QueryRoutesRequest "useMissionControl" Bool 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "useMissionControl" -> (Bool -> f Bool) -> QueryRoutesRequest -> f QueryRoutesRequest

HasField RoutingPolicy "disabled" Bool 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "disabled" -> (Bool -> f Bool) -> RoutingPolicy -> f RoutingPolicy

HasField AbandonChannelRequest "iKnowWhatIAmDoing" Bool 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "iKnowWhatIAmDoing" -> (Bool -> f Bool) -> AbandonChannelRequest -> f AbandonChannelRequest

HasField AbandonChannelRequest "pendingFundingShimOnly" Bool 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "pendingFundingShimOnly" -> (Bool -> f Bool) -> AbandonChannelRequest -> f AbandonChannelRequest

HasField BakeMacaroonRequest "allowExternalPermissions" Bool 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "allowExternalPermissions" -> (Bool -> f Bool) -> BakeMacaroonRequest -> f BakeMacaroonRequest

HasField CheckMacPermResponse "valid" Bool 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "valid" -> (Bool -> f Bool) -> CheckMacPermResponse -> f CheckMacPermResponse

HasField DebugLevelRequest "show" Bool 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "show" -> (Bool -> f Bool) -> DebugLevelRequest -> f DebugLevelRequest

HasField DeleteAllPaymentsRequest "failedHtlcsOnly" Bool 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "failedHtlcsOnly" -> (Bool -> f Bool) -> DeleteAllPaymentsRequest -> f DeleteAllPaymentsRequest

HasField DeleteAllPaymentsRequest "failedPaymentsOnly" Bool 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "failedPaymentsOnly" -> (Bool -> f Bool) -> DeleteAllPaymentsRequest -> f DeleteAllPaymentsRequest

HasField DeleteMacaroonIDResponse "deleted" Bool 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "deleted" -> (Bool -> f Bool) -> DeleteMacaroonIDResponse -> f DeleteMacaroonIDResponse

HasField DeletePaymentRequest "failedHtlcsOnly" Bool 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "failedHtlcsOnly" -> (Bool -> f Bool) -> DeletePaymentRequest -> f DeletePaymentRequest

HasField InterceptFeedback "replaceResponse" Bool 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "replaceResponse" -> (Bool -> f Bool) -> InterceptFeedback -> f InterceptFeedback

HasField Invoice "isAmp" Bool 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "isAmp" -> (Bool -> f Bool) -> Invoice -> f Invoice

HasField Invoice "isKeysend" Bool 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "isKeysend" -> (Bool -> f Bool) -> Invoice -> f Invoice

HasField Invoice "private" Bool 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "private" -> (Bool -> f Bool) -> Invoice -> f Invoice

HasField Invoice "settled" Bool 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "settled" -> (Bool -> f Bool) -> Invoice -> f Invoice

HasField ListInvoiceRequest "pendingOnly" Bool 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "pendingOnly" -> (Bool -> f Bool) -> ListInvoiceRequest -> f ListInvoiceRequest

HasField ListInvoiceRequest "reversed" Bool 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "reversed" -> (Bool -> f Bool) -> ListInvoiceRequest -> f ListInvoiceRequest

HasField ListPaymentsRequest "includeIncomplete" Bool 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "includeIncomplete" -> (Bool -> f Bool) -> ListPaymentsRequest -> f ListPaymentsRequest

HasField ListPaymentsRequest "reversed" Bool 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "reversed" -> (Bool -> f Bool) -> ListPaymentsRequest -> f ListPaymentsRequest

HasField MiddlewareRegistration "readOnlyMode" Bool 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "readOnlyMode" -> (Bool -> f Bool) -> MiddlewareRegistration -> f MiddlewareRegistration

HasField PolicyUpdateRequest "global" Bool 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "global" -> (Bool -> f Bool) -> PolicyUpdateRequest -> f PolicyUpdateRequest

HasField PolicyUpdateRequest "minHtlcMsatSpecified" Bool 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "minHtlcMsatSpecified" -> (Bool -> f Bool) -> PolicyUpdateRequest -> f PolicyUpdateRequest

HasField RPCMessage "streamRpc" Bool 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "streamRpc" -> (Bool -> f Bool) -> RPCMessage -> f RPCMessage

HasField SendPaymentRequest "allowSelfPayment" Bool 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "allowSelfPayment" -> (Bool -> f Bool) -> SendPaymentRequest -> f SendPaymentRequest

HasField SendPaymentRequest "amp" Bool 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "amp" -> (Bool -> f Bool) -> SendPaymentRequest -> f SendPaymentRequest

HasField SendPaymentRequest "noInflightUpdates" Bool 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "noInflightUpdates" -> (Bool -> f Bool) -> SendPaymentRequest -> f SendPaymentRequest

HasField TrackPaymentRequest "noInflightUpdates" Bool 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "noInflightUpdates" -> (Bool -> f Bool) -> TrackPaymentRequest -> f TrackPaymentRequest

HasField SignMessageReq "compactSig" Bool 
Instance details

Defined in Proto.Signrpc.Signer

Methods

fieldOf :: Functor f => Proxy# "compactSig" -> (Bool -> f Bool) -> SignMessageReq -> f SignMessageReq

HasField SignMessageReq "doubleHash" Bool 
Instance details

Defined in Proto.Signrpc.Signer

Methods

fieldOf :: Functor f => Proxy# "doubleHash" -> (Bool -> f Bool) -> SignMessageReq -> f SignMessageReq

HasField VerifyMessageResp "valid" Bool 
Instance details

Defined in Proto.Signrpc.Signer

Methods

fieldOf :: Functor f => Proxy# "valid" -> (Bool -> f Bool) -> VerifyMessageResp -> f VerifyMessageResp

HasField Account "watchOnly" Bool 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "watchOnly" -> (Bool -> f Bool) -> Account -> f Account

HasField AddrRequest "change" Bool 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "change" -> (Bool -> f Bool) -> AddrRequest -> f AddrRequest

HasField BumpFeeRequest "force" Bool 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "force" -> (Bool -> f Bool) -> BumpFeeRequest -> f BumpFeeRequest

HasField FundPsbtRequest "spendUnconfirmed" Bool 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "spendUnconfirmed" -> (Bool -> f Bool) -> FundPsbtRequest -> f FundPsbtRequest

HasField ImportAccountRequest "dryRun" Bool 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "dryRun" -> (Bool -> f Bool) -> ImportAccountRequest -> f ImportAccountRequest

HasField LabelTransactionRequest "overwrite" Bool 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "overwrite" -> (Bool -> f Bool) -> LabelTransactionRequest -> f LabelTransactionRequest

HasField ListSweepsRequest "verbose" Bool 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "verbose" -> (Bool -> f Bool) -> ListSweepsRequest -> f ListSweepsRequest

HasField PendingSweep "force" Bool 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "force" -> (Bool -> f Bool) -> PendingSweep -> f PendingSweep

HasField SendOutputsRequest "spendUnconfirmed" Bool 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "spendUnconfirmed" -> (Bool -> f Bool) -> SendOutputsRequest -> f SendOutputsRequest

HasField ChangePasswordRequest "newMacaroonRootKey" Bool 
Instance details

Defined in Proto.Walletunlocker

Methods

fieldOf :: Functor f => Proxy# "newMacaroonRootKey" -> (Bool -> f Bool) -> ChangePasswordRequest -> f ChangePasswordRequest

HasField ChangePasswordRequest "statelessInit" Bool 
Instance details

Defined in Proto.Walletunlocker

Methods

fieldOf :: Functor f => Proxy# "statelessInit" -> (Bool -> f Bool) -> ChangePasswordRequest -> f ChangePasswordRequest

HasField InitWalletRequest "statelessInit" Bool 
Instance details

Defined in Proto.Walletunlocker

Methods

fieldOf :: Functor f => Proxy# "statelessInit" -> (Bool -> f Bool) -> InitWalletRequest -> f InitWalletRequest

HasField UnlockWalletRequest "statelessInit" Bool 
Instance details

Defined in Proto.Walletunlocker

Methods

fieldOf :: Functor f => Proxy# "statelessInit" -> (Bool -> f Bool) -> UnlockWalletRequest -> f UnlockWalletRequest

HasField InternalFailure "maybe'redacted" (Maybe Bool) 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

fieldOf :: Functor f => Proxy# "maybe'redacted" -> (Maybe Bool -> f (Maybe Bool)) -> InternalFailure -> f InternalFailure

HasField PolicyUpdateRequest "maybe'global" (Maybe Bool) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "maybe'global" -> (Maybe Bool -> f (Maybe Bool)) -> PolicyUpdateRequest -> f PolicyUpdateRequest

(ToFrom a a', SqlSelect b r, ToAlias b, ToAliasReference b, d ~ (a' :& b)) => DoInnerJoin Lateral a (a' -> SqlQuery b, d -> SqlExpr (Value Bool)) d 
Instance details

Defined in Database.Esqueleto.Experimental.From.Join

Methods

doInnerJoin :: Proxy Lateral -> a -> (a' -> SqlQuery b, d -> SqlExpr (Value Bool)) -> From d #

(ToFrom a a', ToMaybe b, d ~ (a' :& ToMaybeT b), SqlSelect b r, ToAlias b, ToAliasReference b) => DoLeftJoin Lateral a (a' -> SqlQuery b, d -> SqlExpr (Value Bool)) d 
Instance details

Defined in Database.Esqueleto.Experimental.From.Join

Methods

doLeftJoin :: Proxy Lateral -> a -> (a' -> SqlQuery b, d -> SqlExpr (Value Bool)) -> From d #

type DemoteRep Bool 
Instance details

Defined in GHC.Generics

type DemoteRep Bool = Bool
type Rep Bool

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

type Rep Bool = D1 ('MetaData "Bool" "GHC.Types" "ghc-prim" 'False) (C1 ('MetaCons "False" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "True" 'PrefixI 'False) (U1 :: Type -> Type))
data Sing (a :: Bool) 
Instance details

Defined in GHC.Generics

data Sing (a :: Bool) where
newtype Vector Bool 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Bool 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Bool = MV_Bool (MVector s Word8)

type String = [Char] #

A String is a list of characters. String constants in Haskell are values of type String.

See Data.List for operations on lists.

data Char #

The character type Char is an enumeration whose values represent Unicode (or equivalently ISO/IEC 10646) code points (i.e. characters, see http://www.unicode.org/ for details). This set extends the ISO 8859-1 (Latin-1) character set (the first 256 characters), which is itself an extension of the ASCII character set (the first 128 characters). A character literal in Haskell has type Char.

To convert a Char to or from the corresponding Int value defined by Unicode, use toEnum and fromEnum from the Enum class respectively (or equivalently ord and chr).

Instances

Instances details
Out Char 
Instance details

Defined in Text.PrettyPrint.GenericPretty

Methods

docPrec :: Int -> Char -> Doc #

doc :: Char -> Doc #

docList :: [Char] -> Doc #

FromJSON Char 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Char 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Char 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Char 
Instance details

Defined in Data.Aeson.Types.ToJSON

Storable Char

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Char -> Int #

alignment :: Char -> Int #

peekElemOff :: Ptr Char -> Int -> IO Char #

pokeElemOff :: Ptr Char -> Int -> Char -> IO () #

peekByteOff :: Ptr b -> Int -> IO Char #

pokeByteOff :: Ptr b -> Int -> Char -> IO () #

peek :: Ptr Char -> IO Char #

poke :: Ptr Char -> Char -> IO () #

Bounded Char

Since: base-2.1

Instance details

Defined in GHC.Enum

Enum Char

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

succ :: Char -> Char #

pred :: Char -> Char #

toEnum :: Int -> Char #

fromEnum :: Char -> Int #

enumFrom :: Char -> [Char] #

enumFromThen :: Char -> Char -> [Char] #

enumFromTo :: Char -> Char -> [Char] #

enumFromThenTo :: Char -> Char -> Char -> [Char] #

Read Char

Since: base-2.1

Instance details

Defined in GHC.Read

Show Char

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Char -> ShowS #

show :: Char -> String #

showList :: [Char] -> ShowS #

Subtractive Char 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Char #

Methods

(-) :: Char -> Char -> Difference Char #

PrimMemoryComparable Char 
Instance details

Defined in Basement.PrimType

PrimType Char 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Char :: Nat #

ToMarkup String 
Instance details

Defined in Text.Blaze

ToMarkup Char 
Instance details

Defined in Text.Blaze

ToValue String 
Instance details

Defined in Text.Blaze

ToValue Char 
Instance details

Defined in Text.Blaze

FoldCase Char 
Instance details

Defined in Data.CaseInsensitive.Internal

Methods

foldCase :: Char -> Char #

foldCaseList :: [Char] -> [Char]

NFData Char 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Char -> () #

ToLogStr String 
Instance details

Defined in System.Log.FastLogger.LogStr

Methods

toLogStr :: String -> LogStr #

Eq Char 
Instance details

Defined in GHC.Classes

Methods

(==) :: Char -> Char -> Bool #

(/=) :: Char -> Char -> Bool #

Ord Char 
Instance details

Defined in GHC.Classes

Methods

compare :: Char -> Char -> Ordering #

(<) :: Char -> Char -> Bool #

(<=) :: Char -> Char -> Bool #

(>) :: Char -> Char -> Bool #

(>=) :: Char -> Char -> Bool #

max :: Char -> Char -> Char #

min :: Char -> Char -> Char #

Hashable Char 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Char -> Int #

hash :: Char -> Int #

FromHttpApiData String 
Instance details

Defined in Web.Internal.HttpApiData

FromHttpApiData Char 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData String 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Char 
Instance details

Defined in Web.Internal.HttpApiData

PathPiece String 
Instance details

Defined in Web.PathPieces

Pretty Char

Instead of (pretty 'n'), consider using line as a more readable alternative.

>>> pretty 'f' <> pretty 'o' <> pretty 'o'
foo
>>> pretty ("string" :: String)
string
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Char -> Doc ann #

prettyList :: [Char] -> Doc ann #

Prim Char 
Instance details

Defined in Data.Primitive.Types

Uniform Char 
Instance details

Defined in System.Random.Internal

Methods

uniformM :: StatefulGen g m => g -> m Char #

UniformRange Char 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Char, Char) -> g -> m Char #

ToJavascript String 
Instance details

Defined in Text.Julius

ToMessage String 
Instance details

Defined in Text.Shakespeare.I18N

Methods

toMessage :: String -> Text #

ErrorList Char 
Instance details

Defined in Control.Monad.Trans.Error

Methods

listMsg :: String -> [Char] #

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 #

Unbox Char 
Instance details

Defined in Data.Vector.Unboxed.Base

ToContent String 
Instance details

Defined in Yesod.Core.Content

Methods

toContent :: String -> Content #

ToFlushBuilder String 
Instance details

Defined in Yesod.Core.Content

ToBuilder Char Builder 
Instance details

Defined in Data.Builder

Methods

toBuilder :: Char -> Builder #

ToBuilder Char Builder 
Instance details

Defined in Data.Builder

Methods

toBuilder :: Char -> Builder #

StringConv ByteString String 
Instance details

Defined in Data.String.Conv

StringConv ByteString String 
Instance details

Defined in Data.String.Conv

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 #

StringConv String ByteString 
Instance details

Defined in Data.String.Conv

StringConv String ByteString 
Instance details

Defined in Data.String.Conv

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 String String 
Instance details

Defined in Data.String.Conv

Methods

strConv :: Leniency -> String -> String #

Lift Char 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Char -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Char -> Code m Char #

ConvertUtf8 String ByteString 
Instance details

Defined in Universum.String.Conversion

ConvertUtf8 String ByteString 
Instance details

Defined in Universum.String.Conversion

Vector Vector Char 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Char 
Instance details

Defined in Data.Vector.Unboxed.Base

From HostName LnHost Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

Methods

from :: HostName -> LnHost

RedirectUrl master String 
Instance details

Defined in Yesod.Core.Handler

Methods

toTextUrl :: (MonadHandler m, HandlerSite m ~ master) => String -> m Text #

Generic1 (URec Char :: k -> Type) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 (URec Char) :: k -> Type #

Methods

from1 :: forall (a :: k0). URec Char a -> Rep1 (URec Char) a #

to1 :: forall (a :: k0). Rep1 (URec Char) a -> URec Char a #

Lift (String -> CloseStyle) 
Instance details

Defined in Text.Hamlet.Parse

Methods

lift :: Quote m => (String -> CloseStyle) -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => (String -> CloseStyle) -> Code m (String -> CloseStyle) #

Foldable (UChar :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => UChar m -> m #

foldMap :: Monoid m => (a -> m) -> UChar a -> m #

foldMap' :: Monoid m => (a -> m) -> UChar a -> m #

foldr :: (a -> b -> b) -> b -> UChar a -> b #

foldr' :: (a -> b -> b) -> b -> UChar a -> b #

foldl :: (b -> a -> b) -> b -> UChar a -> b #

foldl' :: (b -> a -> b) -> b -> UChar a -> b #

foldr1 :: (a -> a -> a) -> UChar a -> a #

foldl1 :: (a -> a -> a) -> UChar a -> a #

toList :: UChar a -> [a] #

null :: UChar a -> Bool #

length :: UChar a -> Int #

elem :: Eq a => a -> UChar a -> Bool #

maximum :: Ord a => UChar a -> a #

minimum :: Ord a => UChar a -> a #

sum :: Num a => UChar a -> a #

product :: Num a => UChar a -> a #

Traversable (UChar :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> UChar a -> f (UChar b) #

sequenceA :: Applicative f => UChar (f a) -> f (UChar a) #

mapM :: Monad m => (a -> m b) -> UChar a -> m (UChar b) #

sequence :: Monad m => UChar (m a) -> m (UChar a) #

QueryKeyLike [Char] 
Instance details

Defined in Network.HTTP.Types.QueryLike

Methods

toQueryKey :: [Char] -> ByteString #

QueryValueLike [Char] 
Instance details

Defined in Network.HTTP.Types.QueryLike

PersistField [Char] 
Instance details

Defined in Database.Persist.Class.PersistField

PersistFieldSql [Char] 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy [Char] -> SqlType #

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 #

ToAttributes [(String, String)] 
Instance details

Defined in Text.Hamlet

Methods

toAttributes :: [(String, String)] -> [(Text, Text)] #

ToCss [Char] 
Instance details

Defined in Text.Internal.Css

Methods

toCss :: [Char] -> Builder #

RawJS [Char] 
Instance details

Defined in Text.Julius

Methods

rawJS :: [Char] -> RawJavascript #

Print [Char] 
Instance details

Defined in Universum.Print.Internal

Methods

hPutStr :: Handle -> [Char] -> IO () #

hPutStrLn :: Handle -> [Char] -> IO () #

ToFlushBuilder (Flush String) 
Instance details

Defined in Yesod.Core.Content

ToTypedContent [Char] 
Instance details

Defined in Yesod.Core.Content

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 #

ToAttributes (String, String) 
Instance details

Defined in Text.Hamlet

Methods

toAttributes :: (String, String) -> [(Text, Text)] #

Generic (URec Char p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Char p) :: Type -> Type #

Methods

from :: URec Char p -> Rep (URec Char p) x #

to :: Rep (URec Char p) x -> URec Char p #

Show (URec Char p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> URec Char p -> ShowS #

show :: URec Char p -> String #

showList :: [URec Char p] -> ShowS #

Eq (URec Char p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: URec Char p -> URec Char p -> Bool #

(/=) :: URec Char p -> URec Char p -> Bool #

Ord (URec Char p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: URec Char p -> URec Char p -> Ordering #

(<) :: URec Char p -> URec Char p -> Bool #

(<=) :: URec Char p -> URec Char p -> Bool #

(>) :: URec Char p -> URec Char p -> Bool #

(>=) :: URec Char p -> URec Char p -> Bool #

max :: URec Char p -> URec Char p -> URec Char p #

min :: URec Char p -> URec Char p -> URec Char p #

type NatNumMaxBound Char 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Char = 1114111
type Difference Char 
Instance details

Defined in Basement.Numerical.Subtractive

type PrimSize Char 
Instance details

Defined in Basement.PrimType

type PrimSize Char = 4
newtype Vector Char 
Instance details

Defined in Data.Vector.Unboxed.Base

data URec Char (p :: k)

Used for marking occurrences of Char#

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

data URec Char (p :: k) = UChar {}
newtype MVector s Char 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Char = MV_Char (MVector s Char)
type 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

Instances details
Out Double 
Instance details

Defined in Text.PrettyPrint.GenericPretty

Methods

docPrec :: Int -> Double -> Doc #

doc :: Double -> Doc #

docList :: [Double] -> Doc #

FromJSON Double 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Double 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Double 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Double 
Instance details

Defined in Data.Aeson.Types.ToJSON

Storable Double

Since: base-2.1

Instance details

Defined in Foreign.Storable

Floating Double

Since: base-2.1

Instance details

Defined in GHC.Float

RealFloat Double

Since: base-2.1

Instance details

Defined in GHC.Float

Read Double

Since: base-2.1

Instance details

Defined in GHC.Read

Subtractive Double 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Double #

PrimType Double 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Double :: Nat #

ToMarkup Double 
Instance details

Defined in Text.Blaze

ToValue Double 
Instance details

Defined in Text.Blaze

Default Double 
Instance details

Defined in Data.Default.Class

Methods

def :: Double #

NFData Double 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Double -> () #

ToLogStr Double

Since: fast-logger-2.4.14

Instance details

Defined in System.Log.FastLogger.LogStr

Methods

toLogStr :: Double -> LogStr #

Eq Double

Note that due to the presence of NaN, Double's Eq instance does not satisfy reflexivity.

>>> 0/0 == (0/0 :: Double)
False

Also note that Double's Eq instance does not satisfy substitutivity:

>>> 0 == (-0 :: Double)
True
>>> recip 0 == recip (-0 :: Double)
False
Instance details

Defined in GHC.Classes

Methods

(==) :: Double -> Double -> Bool #

(/=) :: Double -> Double -> Bool #

Ord Double

Note that due to the presence of NaN, Double's Ord instance does not satisfy reflexivity.

>>> 0/0 <= (0/0 :: Double)
False

Also note that, due to the same, Ord's operator interactions are not respected by Double's instance:

>>> (0/0 :: Double) > 1
False
>>> compare (0/0 :: Double) 1
GT
Instance details

Defined in GHC.Classes

Hashable Double

Note: prior to hashable-1.3.0.0, hash 0.0 /= hash (-0.0)

The hash of NaN is not well defined.

Since: hashable-1.3.0.0

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Double -> Int #

hash :: Double -> Int #

FromHttpApiData Double 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Double 
Instance details

Defined in Web.Internal.HttpApiData

PersistField Double 
Instance details

Defined in Database.Persist.Class.PersistField

PersistFieldSql Double 
Instance details

Defined in Database.Persist.Sql.Class

Pretty Double
>>> pretty (exp 1 :: Double)
2.71828182845904...
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Double -> Doc ann #

prettyList :: [Double] -> Doc ann #

Prim Double 
Instance details

Defined in Data.Primitive.Types

FieldDefault Double 
Instance details

Defined in Data.ProtoLens.Message

UniformRange Double

See Floating point number caveats.

Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Double, Double) -> g -> m Double #

Unbox Double 
Instance details

Defined in Data.Vector.Unboxed.Base

Lift Double 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Double -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Double -> Code m Double #

Vector Vector Double 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Double 
Instance details

Defined in Data.Vector.Unboxed.Base

HasField GetRecoveryInfoResponse "progress" Double 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "progress" -> (Double -> f Double) -> GetRecoveryInfoResponse -> f GetRecoveryInfoResponse

HasField FloatMetric "normalizedValue" Double 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "normalizedValue" -> (Double -> f Double) -> FloatMetric -> f FloatMetric

HasField FloatMetric "value" Double 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "value" -> (Double -> f Double) -> FloatMetric -> f FloatMetric

HasField NetworkInfo "avgChannelSize" Double 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "avgChannelSize" -> (Double -> f Double) -> NetworkInfo -> f NetworkInfo

HasField NetworkInfo "avgOutDegree" Double 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "avgOutDegree" -> (Double -> f Double) -> NetworkInfo -> f NetworkInfo

HasField QueryRoutesResponse "successProb" Double 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "successProb" -> (Double -> f Double) -> QueryRoutesResponse -> f QueryRoutesResponse

HasField ChannelFeeReport "feeRate" Double 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "feeRate" -> (Double -> f Double) -> ChannelFeeReport -> f ChannelFeeReport

HasField PolicyUpdateRequest "feeRate" Double 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "feeRate" -> (Double -> f Double) -> PolicyUpdateRequest -> f PolicyUpdateRequest

HasField QueryProbabilityResponse "probability" Double 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "probability" -> (Double -> f Double) -> QueryProbabilityResponse -> f QueryProbabilityResponse

Generic1 (URec Double :: k -> Type) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 (URec Double) :: k -> Type #

Methods

from1 :: forall (a :: k0). URec Double a -> Rep1 (URec Double) a #

to1 :: forall (a :: k0). Rep1 (URec Double) a -> URec Double a #

Foldable (UDouble :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => UDouble m -> m #

foldMap :: Monoid m => (a -> m) -> UDouble a -> m #

foldMap' :: Monoid m => (a -> m) -> UDouble a -> m #

foldr :: (a -> b -> b) -> b -> UDouble a -> b #

foldr' :: (a -> b -> b) -> b -> UDouble a -> b #

foldl :: (b -> a -> b) -> b -> UDouble a -> b #

foldl' :: (b -> a -> b) -> b -> UDouble a -> b #

foldr1 :: (a -> a -> a) -> UDouble a -> a #

foldl1 :: (a -> a -> a) -> UDouble a -> a #

toList :: UDouble a -> [a] #

null :: UDouble a -> Bool #

length :: UDouble a -> Int #

elem :: Eq a => a -> UDouble a -> Bool #

maximum :: Ord a => UDouble a -> a #

minimum :: Ord a => UDouble a -> a #

sum :: Num a => UDouble a -> a #

product :: Num a => UDouble a -> a #

Traversable (UDouble :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> UDouble a -> f (UDouble b) #

sequenceA :: Applicative f => UDouble (f a) -> f (UDouble a) #

mapM :: Monad m => (a -> m b) -> UDouble a -> m (UDouble b) #

sequence :: Monad m => UDouble (m a) -> m (UDouble a) #

Functor (URec Double :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> URec Double a -> URec Double b #

(<$) :: a -> URec Double b -> URec Double a #

Generic (URec Double p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Double p) :: Type -> Type #

Methods

from :: URec Double p -> Rep (URec Double p) x #

to :: Rep (URec Double p) x -> URec Double p #

Show (URec Double p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> URec Double p -> ShowS #

show :: URec Double p -> String #

showList :: [URec Double p] -> ShowS #

Eq (URec Double p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: URec Double p -> URec Double p -> Bool #

(/=) :: URec Double p -> URec Double p -> Bool #

Ord (URec Double p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: URec Double p -> URec Double p -> Ordering #

(<) :: URec Double p -> URec Double p -> Bool #

(<=) :: URec Double p -> URec Double p -> Bool #

(>) :: URec Double p -> URec Double p -> Bool #

(>=) :: URec Double p -> URec Double p -> Bool #

max :: URec Double p -> URec Double p -> URec Double p #

min :: URec Double p -> URec Double p -> URec Double p #

type Difference Double 
Instance details

Defined in Basement.Numerical.Subtractive

type PrimSize Double 
Instance details

Defined in Basement.PrimType

type PrimSize Double = 8
newtype Vector Double 
Instance details

Defined in Data.Vector.Unboxed.Base

data URec Double (p :: k)

Used for marking occurrences of Double#

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

data URec Double (p :: k) = UDouble {}
newtype MVector s Double 
Instance details

Defined in Data.Vector.Unboxed.Base

type Rep1 (URec Double :: k -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

type Rep1 (URec Double :: k -> Type) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UDouble" 'PrefixI 'True) (S1 ('MetaSel ('Just "uDouble#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UDouble :: k -> Type)))
type Rep (URec Double p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

type Rep (URec Double p) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UDouble" 'PrefixI 'True) (S1 ('MetaSel ('Just "uDouble#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UDouble :: Type -> Type)))

data Float #

Single-precision floating point numbers. It is desirable that this type be at least equal in range and precision to the IEEE single-precision type.

Constructors

F# Float# 

Instances

Instances details
Out Float 
Instance details

Defined in Text.PrettyPrint.GenericPretty

Methods

docPrec :: Int -> Float -> Doc #

doc :: Float -> Doc #

docList :: [Float] -> Doc #

TiffSaveable PixelF 
Instance details

Defined in Codec.Picture.Tiff

Unpackable Float 
Instance details

Defined in Codec.Picture.Tiff

Associated Types

type StorageType Float

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

PackeablePixel PixelF 
Instance details

Defined in Codec.Picture.Types

Associated Types

type PackedRepresentation PixelF #

Pixel PixelF 
Instance details

Defined in Codec.Picture.Types

Associated Types

type PixelBaseComponent PixelF #

FromJSON Float 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Float 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Float 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Float 
Instance details

Defined in Data.Aeson.Types.ToJSON

Storable Float

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Float -> Int #

alignment :: Float -> Int #

peekElemOff :: Ptr Float -> Int -> IO Float #

pokeElemOff :: Ptr Float -> Int -> Float -> IO () #

peekByteOff :: Ptr b -> Int -> IO Float #

pokeByteOff :: Ptr b -> Int -> Float -> IO () #

peek :: Ptr Float -> IO Float #

poke :: Ptr Float -> Float -> IO () #

Floating Float

Since: base-2.1

Instance details

Defined in GHC.Float

RealFloat Float

Since: base-2.1

Instance details

Defined in GHC.Float

Read Float

Since: base-2.1

Instance details

Defined in GHC.Read

Subtractive Float 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Float #

Methods

(-) :: Float -> Float -> Difference Float #

PrimType Float 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Float :: Nat #

ToMarkup Float 
Instance details

Defined in Text.Blaze

ToValue Float 
Instance details

Defined in Text.Blaze

Default Float 
Instance details

Defined in Data.Default.Class

Methods

def :: Float #

NFData Float 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Float -> () #

ToLogStr Float

Since: fast-logger-2.4.14

Instance details

Defined in System.Log.FastLogger.LogStr

Methods

toLogStr :: Float -> LogStr #

Eq Float

Note that due to the presence of NaN, Float's Eq instance does not satisfy reflexivity.

>>> 0/0 == (0/0 :: Float)
False

Also note that Float's Eq instance does not satisfy substitutivity:

>>> 0 == (-0 :: Float)
True
>>> recip 0 == recip (-0 :: Float)
False
Instance details

Defined in GHC.Classes

Methods

(==) :: Float -> Float -> Bool #

(/=) :: Float -> Float -> Bool #

Ord Float

Note that due to the presence of NaN, Float's Ord instance does not satisfy reflexivity.

>>> 0/0 <= (0/0 :: Float)
False

Also note that, due to the same, Ord's operator interactions are not respected by Float's instance:

>>> (0/0 :: Float) > 1
False
>>> compare (0/0 :: Float) 1
GT
Instance details

Defined in GHC.Classes

Methods

compare :: Float -> Float -> Ordering #

(<) :: Float -> Float -> Bool #

(<=) :: Float -> Float -> Bool #

(>) :: Float -> Float -> Bool #

(>=) :: Float -> Float -> Bool #

max :: Float -> Float -> Float #

min :: Float -> Float -> Float #

Hashable Float

Note: prior to hashable-1.3.0.0, hash 0.0 /= hash (-0.0)

The hash of NaN is not well defined.

Since: hashable-1.3.0.0

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Float -> Int #

hash :: Float -> Int #

FromHttpApiData Float 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Float 
Instance details

Defined in Web.Internal.HttpApiData

Pretty Float
>>> pretty (pi :: Float)
3.1415927
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Float -> Doc ann #

prettyList :: [Float] -> Doc ann #

Prim Float 
Instance details

Defined in Data.Primitive.Types

FieldDefault Float 
Instance details

Defined in Data.ProtoLens.Message

UniformRange Float

See Floating point number caveats.

Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Float, Float) -> g -> m Float #

Unbox Float 
Instance details

Defined in Data.Vector.Unboxed.Base

ColorConvertible Pixel8 PixelF 
Instance details

Defined in Codec.Picture.Types

ColorConvertible PixelF PixelRGBF 
Instance details

Defined in Codec.Picture.Types

Lift Float 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Float -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Float -> Code m Float #

Vector Vector Float 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Float 
Instance details

Defined in Data.Vector.Unboxed.Base

HasField MissionControlConfig "hopProbability" Float 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "hopProbability" -> (Float -> f Float) -> MissionControlConfig -> f MissionControlConfig

HasField MissionControlConfig "weight" Float 
Instance details

Defined in Proto.Routerrpc.Router

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 :: forall (a :: k0). URec Float a -> Rep1 (URec Float) a #

to1 :: forall (a :: k0). Rep1 (URec Float) a -> URec Float a #

Foldable (UFloat :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => UFloat m -> m #

foldMap :: Monoid m => (a -> m) -> UFloat a -> m #

foldMap' :: Monoid m => (a -> m) -> UFloat a -> m #

foldr :: (a -> b -> b) -> b -> UFloat a -> b #

foldr' :: (a -> b -> b) -> b -> UFloat a -> b #

foldl :: (b -> a -> b) -> b -> UFloat a -> b #

foldl' :: (b -> a -> b) -> b -> UFloat a -> b #

foldr1 :: (a -> a -> a) -> UFloat a -> a #

foldl1 :: (a -> a -> a) -> UFloat a -> a #

toList :: UFloat a -> [a] #

null :: UFloat a -> Bool #

length :: UFloat a -> Int #

elem :: Eq a => a -> UFloat a -> Bool #

maximum :: Ord a => UFloat a -> a #

minimum :: Ord a => UFloat a -> a #

sum :: Num a => UFloat a -> a #

product :: Num a => UFloat a -> a #

Traversable (UFloat :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> UFloat a -> f (UFloat b) #

sequenceA :: Applicative f => UFloat (f a) -> f (UFloat a) #

mapM :: Monad m => (a -> m b) -> UFloat a -> m (UFloat b) #

sequence :: Monad m => UFloat (m a) -> m (UFloat a) #

Functor (URec Float :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> URec Float a -> URec Float b #

(<$) :: a -> URec Float b -> URec Float a #

Generic (URec Float p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Float p) :: Type -> Type #

Methods

from :: URec Float p -> Rep (URec Float p) x #

to :: Rep (URec Float p) x -> URec Float p #

Show (URec Float p) 
Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> URec Float p -> ShowS #

show :: URec Float p -> String #

showList :: [URec Float p] -> ShowS #

Eq (URec Float p) 
Instance details

Defined in GHC.Generics

Methods

(==) :: URec Float p -> URec Float p -> Bool #

(/=) :: URec Float p -> URec Float p -> Bool #

Ord (URec Float p) 
Instance details

Defined in GHC.Generics

Methods

compare :: URec Float p -> URec Float p -> Ordering #

(<) :: URec Float p -> URec Float p -> Bool #

(<=) :: URec Float p -> URec Float p -> Bool #

(>) :: URec Float p -> URec Float p -> Bool #

(>=) :: URec Float p -> URec Float p -> Bool #

max :: URec Float p -> URec Float p -> URec Float p #

min :: URec Float p -> URec Float p -> URec Float p #

type StorageType Float 
Instance details

Defined in Codec.Picture.Tiff

type StorageType Float = Float
type PackedRepresentation PixelF 
Instance details

Defined in Codec.Picture.Types

type PixelBaseComponent PixelF 
Instance details

Defined in Codec.Picture.Types

type Difference Float 
Instance details

Defined in Basement.Numerical.Subtractive

type PrimSize Float 
Instance details

Defined in Basement.PrimType

type PrimSize Float = 4
newtype Vector Float 
Instance details

Defined in Data.Vector.Unboxed.Base

data URec Float (p :: k)

Used for marking occurrences of Float#

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

data URec Float (p :: k) = UFloat {}
newtype MVector s Float 
Instance details

Defined in Data.Vector.Unboxed.Base

type Rep1 (URec Float :: k -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

type Rep1 (URec Float :: k -> Type) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UFloat" 'PrefixI 'True) (S1 ('MetaSel ('Just "uFloat#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UFloat :: k -> Type)))
type Rep (URec Float p) 
Instance details

Defined in GHC.Generics

type Rep (URec Float p) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UFloat" 'PrefixI 'True) (S1 ('MetaSel ('Just "uFloat#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UFloat :: Type -> Type)))

data Int #

A fixed-precision integer type with at least the range [-2^29 .. 2^29-1]. The exact range for a given implementation can be determined by using minBound and maxBound from the Bounded class.

Instances

Instances details
Out Int 
Instance details

Defined in Text.PrettyPrint.GenericPretty

Methods

docPrec :: Int -> Int -> Doc #

doc :: Int -> Doc #

docList :: [Int] -> Doc #

FromJSON Int 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Int 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Int 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Int 
Instance details

Defined in Data.Aeson.Types.ToJSON

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

Storable Int

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Int -> Int #

alignment :: Int -> Int #

peekElemOff :: Ptr Int -> Int -> IO Int #

pokeElemOff :: Ptr Int -> Int -> Int -> IO () #

peekByteOff :: Ptr b -> Int -> IO Int #

pokeByteOff :: Ptr b -> Int -> Int -> IO () #

peek :: Ptr Int -> IO Int #

poke :: Ptr Int -> Int -> IO () #

Bounded Int

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

minBound :: Int #

maxBound :: Int #

Enum Int

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

succ :: Int -> Int #

pred :: Int -> Int #

toEnum :: Int -> Int #

fromEnum :: Int -> Int #

enumFrom :: Int -> [Int] #

enumFromThen :: Int -> Int -> [Int] #

enumFromTo :: Int -> Int -> [Int] #

enumFromThenTo :: Int -> Int -> Int -> [Int] #

Num Int

Since: base-2.1

Instance details

Defined in GHC.Num

Methods

(+) :: Int -> Int -> Int #

(-) :: Int -> Int -> Int #

(*) :: Int -> Int -> Int #

negate :: Int -> Int #

abs :: Int -> Int #

signum :: Int -> Int #

fromInteger :: Integer -> Int #

Read Int

Since: base-2.1

Instance details

Defined in GHC.Read

Integral Int

Since: base-2.0.1

Instance details

Defined in GHC.Real

Methods

quot :: Int -> Int -> Int #

rem :: Int -> Int -> Int #

div :: Int -> Int -> Int #

mod :: Int -> Int -> Int #

quotRem :: Int -> Int -> (Int, Int) #

divMod :: Int -> Int -> (Int, Int) #

toInteger :: Int -> Integer #

Real Int

Since: base-2.0.1

Instance details

Defined in GHC.Real

Methods

toRational :: Int -> Rational #

Show Int

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Int -> ShowS #

show :: Int -> String #

showList :: [Int] -> ShowS #

Subtractive Int 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Int #

Methods

(-) :: Int -> Int -> Difference Int #

PrimMemoryComparable Int 
Instance details

Defined in Basement.PrimType

PrimType Int 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Int :: Nat #

ToMarkup Int 
Instance details

Defined in Text.Blaze

ToValue Int 
Instance details

Defined in Text.Blaze

Default Int 
Instance details

Defined in Data.Default.Class

Methods

def :: Int #

NFData Int 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int -> () #

ToLogStr Int

Since: fast-logger-2.4.14

Instance details

Defined in System.Log.FastLogger.LogStr

Methods

toLogStr :: Int -> LogStr #

Eq Int 
Instance details

Defined in GHC.Classes

Methods

(==) :: Int -> Int -> Bool #

(/=) :: Int -> Int -> Bool #

Ord Int 
Instance details

Defined in GHC.Classes

Methods

compare :: Int -> Int -> Ordering #

(<) :: Int -> Int -> Bool #

(<=) :: Int -> Int -> Bool #

(>) :: Int -> Int -> Bool #

(>=) :: Int -> Int -> Bool #

max :: Int -> Int -> Int #

min :: Int -> Int -> Int #

Hashable Int 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int -> Int #

hash :: Int -> Int #

FromHttpApiData Int 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Int 
Instance details

Defined in Web.Internal.HttpApiData

PathPiece Int 
Instance details

Defined in Web.PathPieces

PersistField Int 
Instance details

Defined in Database.Persist.Class.PersistField

PersistFieldSql Int 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Int -> SqlType #

Pretty Int
>>> pretty (123 :: Int)
123
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Int -> Doc ann #

prettyList :: [Int] -> Doc ann #

Prim Int 
Instance details

Defined in Data.Primitive.Types

Uniform Int 
Instance details

Defined in System.Random.Internal

Methods

uniformM :: StatefulGen g m => g -> m Int #

UniformRange Int 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Int, Int) -> g -> m Int #

ByteSource Int 
Instance details

Defined in Data.UUID.Types.Internal.Builder

Methods

(/-/) :: ByteSink Int g -> Int -> g

Unbox Int 
Instance details

Defined in Data.Vector.Unboxed.Base

Lift Int 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Int -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Int -> Code m Int #

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

Vector Vector Int 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Int 
Instance details

Defined in Data.Vector.Unboxed.Base

From Int RowQty Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Int -> RowQty

Generic1 (URec Int :: k -> Type) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 (URec Int) :: k -> Type #

Methods

from1 :: forall (a :: k0). URec Int a -> Rep1 (URec Int) a #

to1 :: forall (a :: k0). Rep1 (URec Int) a -> URec Int a #

Foldable (UInt :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => UInt m -> m #

foldMap :: Monoid m => (a -> m) -> UInt a -> m #

foldMap' :: Monoid m => (a -> m) -> UInt a -> m #

foldr :: (a -> b -> b) -> b -> UInt a -> b #

foldr' :: (a -> b -> b) -> b -> UInt a -> b #

foldl :: (b -> a -> b) -> b -> UInt a -> b #

foldl' :: (b -> a -> b) -> b -> UInt a -> b #

foldr1 :: (a -> a -> a) -> UInt a -> a #

foldl1 :: (a -> a -> a) -> UInt a -> a #

toList :: UInt a -> [a] #

null :: UInt a -> Bool #

length :: UInt a -> Int #

elem :: Eq a => a -> UInt a -> Bool #

maximum :: Ord a => UInt a -> a #

minimum :: Ord a => UInt a -> a #

sum :: Num a => UInt a -> a #

product :: Num a => UInt a -> a #

Traversable (UInt :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> UInt a -> f (UInt b) #

sequenceA :: Applicative f => UInt (f a) -> f (UInt a) #

mapM :: Monad m => (a -> m b) -> UInt a -> m (UInt b) #

sequence :: Monad m => UInt (m a) -> m (UInt a) #

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 #

Generic (URec Int p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Int p) :: Type -> Type #

Methods

from :: URec Int p -> Rep (URec Int p) x #

to :: Rep (URec Int p) x -> URec Int p #

Show (URec Int p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> URec Int p -> ShowS #

show :: URec Int p -> String #

showList :: [URec Int p] -> ShowS #

Eq (URec Int p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: URec Int p -> URec Int p -> Bool #

(/=) :: URec Int p -> URec Int p -> Bool #

Ord (URec Int p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: URec Int p -> URec Int p -> Ordering #

(<) :: URec Int p -> URec Int p -> Bool #

(<=) :: URec Int p -> URec Int p -> Bool #

(>) :: URec Int p -> URec Int p -> Bool #

(>=) :: URec Int p -> URec Int p -> Bool #

max :: URec Int p -> URec Int p -> URec Int p #

min :: URec Int p -> URec Int p -> URec Int p #

type NatNumMaxBound Int 
Instance details

Defined in Basement.Nat

type Difference Int 
Instance details

Defined in Basement.Numerical.Subtractive

type PrimSize Int 
Instance details

Defined in Basement.PrimType

type PrimSize Int = 8
newtype Vector Int 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector Int = V_Int (Vector Int)
data URec Int (p :: k)

Used for marking occurrences of Int#

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

data URec Int (p :: k) = UInt {}
type ByteSink Int g 
Instance details

Defined in Data.UUID.Types.Internal.Builder

type ByteSink Int g = Takes4Bytes g
newtype MVector s Int 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Int = MV_Int (MVector s Int)
type Rep1 (URec Int :: k -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

type Rep1 (URec Int :: k -> Type) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UInt" 'PrefixI 'True) (S1 ('MetaSel ('Just "uInt#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UInt :: k -> Type)))
type Rep (URec Int p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

type Rep (URec Int p) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UInt" 'PrefixI 'True) (S1 ('MetaSel ('Just "uInt#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UInt :: Type -> Type)))

data Int8 #

8-bit signed integer type

Instances

Instances details
FromJSON Int8 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Int8 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Int8 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Int8 
Instance details

Defined in Data.Aeson.Types.ToJSON

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

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 () #

Bounded Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Enum Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

succ :: Int8 -> Int8 #

pred :: Int8 -> Int8 #

toEnum :: Int -> Int8 #

fromEnum :: Int8 -> Int #

enumFrom :: Int8 -> [Int8] #

enumFromThen :: Int8 -> Int8 -> [Int8] #

enumFromTo :: Int8 -> Int8 -> [Int8] #

enumFromThenTo :: Int8 -> Int8 -> Int8 -> [Int8] #

Ix Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

range :: (Int8, Int8) -> [Int8] #

index :: (Int8, Int8) -> Int8 -> Int #

unsafeIndex :: (Int8, Int8) -> Int8 -> Int #

inRange :: (Int8, Int8) -> Int8 -> Bool #

rangeSize :: (Int8, Int8) -> Int #

unsafeRangeSize :: (Int8, Int8) -> Int #

Num Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

(+) :: Int8 -> Int8 -> Int8 #

(-) :: Int8 -> Int8 -> Int8 #

(*) :: Int8 -> Int8 -> Int8 #

negate :: Int8 -> Int8 #

abs :: Int8 -> Int8 #

signum :: Int8 -> Int8 #

fromInteger :: Integer -> Int8 #

Read Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Integral Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

quot :: Int8 -> Int8 -> Int8 #

rem :: Int8 -> Int8 -> Int8 #

div :: Int8 -> Int8 -> Int8 #

mod :: Int8 -> Int8 -> Int8 #

quotRem :: Int8 -> Int8 -> (Int8, Int8) #

divMod :: Int8 -> Int8 -> (Int8, Int8) #

toInteger :: Int8 -> Integer #

Real Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

toRational :: Int8 -> Rational #

Show Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

showsPrec :: Int -> Int8 -> ShowS #

show :: Int8 -> String #

showList :: [Int8] -> ShowS #

BitOps Int8 
Instance details

Defined in Basement.Bits

FiniteBitsOps Int8 
Instance details

Defined in Basement.Bits

Subtractive Int8 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Int8 #

Methods

(-) :: Int8 -> Int8 -> Difference Int8 #

PrimMemoryComparable Int8 
Instance details

Defined in Basement.PrimType

PrimType Int8 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Int8 :: Nat #

Default Int8 
Instance details

Defined in Data.Default.Class

Methods

def :: Int8 #

NFData Int8 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int8 -> () #

ToLogStr Int8

Since: fast-logger-2.4.14

Instance details

Defined in System.Log.FastLogger.LogStr

Methods

toLogStr :: Int8 -> LogStr #

Eq Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

(==) :: Int8 -> Int8 -> Bool #

(/=) :: Int8 -> Int8 -> Bool #

Ord Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

compare :: Int8 -> Int8 -> Ordering #

(<) :: Int8 -> Int8 -> Bool #

(<=) :: Int8 -> Int8 -> Bool #

(>) :: Int8 -> Int8 -> Bool #

(>=) :: Int8 -> Int8 -> Bool #

max :: Int8 -> Int8 -> Int8 #

min :: Int8 -> Int8 -> Int8 #

Hashable Int8 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int8 -> Int #

hash :: Int8 -> Int #

FromHttpApiData Int8 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Int8 
Instance details

Defined in Web.Internal.HttpApiData

PathPiece Int8 
Instance details

Defined in Web.PathPieces

PersistField Int8 
Instance details

Defined in Database.Persist.Class.PersistField

PersistFieldSql Int8 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Int8 -> SqlType #

Pretty Int8 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Int8 -> Doc ann #

prettyList :: [Int8] -> Doc ann #

Prim Int8 
Instance details

Defined in Data.Primitive.Types

Uniform Int8 
Instance details

Defined in System.Random.Internal

Methods

uniformM :: StatefulGen g m => g -> m Int8 #

UniformRange Int8 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Int8, Int8) -> g -> m Int8 #

Unbox Int8 
Instance details

Defined in Data.Vector.Unboxed.Base

Lift Int8 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Int8 -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Int8 -> Code m Int8 #

Vector Vector Int8 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Int8 
Instance details

Defined in Data.Vector.Unboxed.Base

type NatNumMaxBound Int8 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Int8 = 127
type Difference Int8 
Instance details

Defined in Basement.Numerical.Subtractive

type PrimSize Int8 
Instance details

Defined in Basement.PrimType

type PrimSize Int8 = 1
newtype Vector Int8 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Int8 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Int8 = MV_Int8 (MVector s Int8)

data Int16 #

16-bit signed integer type

Instances

Instances details
FromJSON Int16 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Int16 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Int16 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Int16 
Instance details

Defined in Data.Aeson.Types.ToJSON

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

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 () #

Bounded Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Enum Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Ix Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Num Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Read Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Integral Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Real Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

toRational :: Int16 -> Rational #

Show Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

showsPrec :: Int -> Int16 -> ShowS #

show :: Int16 -> String #

showList :: [Int16] -> ShowS #

BitOps Int16 
Instance details

Defined in Basement.Bits

FiniteBitsOps Int16 
Instance details

Defined in Basement.Bits

Subtractive Int16 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Int16 #

Methods

(-) :: Int16 -> Int16 -> Difference Int16 #

PrimMemoryComparable Int16 
Instance details

Defined in Basement.PrimType

PrimType Int16 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Int16 :: Nat #

Default Int16 
Instance details

Defined in Data.Default.Class

Methods

def :: Int16 #

NFData Int16 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int16 -> () #

ToLogStr Int16

Since: fast-logger-2.4.14

Instance details

Defined in System.Log.FastLogger.LogStr

Methods

toLogStr :: Int16 -> LogStr #

Eq Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

(==) :: Int16 -> Int16 -> Bool #

(/=) :: Int16 -> Int16 -> Bool #

Ord Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

compare :: Int16 -> Int16 -> Ordering #

(<) :: Int16 -> Int16 -> Bool #

(<=) :: Int16 -> Int16 -> Bool #

(>) :: Int16 -> Int16 -> Bool #

(>=) :: Int16 -> Int16 -> Bool #

max :: Int16 -> Int16 -> Int16 #

min :: Int16 -> Int16 -> Int16 #

Hashable Int16 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int16 -> Int #

hash :: Int16 -> Int #

FromHttpApiData Int16 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Int16 
Instance details

Defined in Web.Internal.HttpApiData

PathPiece Int16 
Instance details

Defined in Web.PathPieces

PersistField Int16 
Instance details

Defined in Database.Persist.Class.PersistField

PersistFieldSql Int16 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Int16 -> SqlType #

Pretty Int16 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Int16 -> Doc ann #

prettyList :: [Int16] -> Doc ann #

Prim Int16 
Instance details

Defined in Data.Primitive.Types

Uniform Int16 
Instance details

Defined in System.Random.Internal

Methods

uniformM :: StatefulGen g m => g -> m Int16 #

UniformRange Int16 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Int16, Int16) -> g -> m Int16 #

Unbox Int16 
Instance details

Defined in Data.Vector.Unboxed.Base

Lift Int16 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Int16 -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Int16 -> Code m Int16 #

Vector Vector Int16 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Int16 
Instance details

Defined in Data.Vector.Unboxed.Base

type NatNumMaxBound Int16 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Int16 = 32767
type Difference Int16 
Instance details

Defined in Basement.Numerical.Subtractive

type PrimSize Int16 
Instance details

Defined in Basement.PrimType

type PrimSize Int16 = 2
newtype Vector Int16 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Int16 
Instance details

Defined in Data.Vector.Unboxed.Base

data Int32 #

32-bit signed integer type

Instances

Instances details
FromJSON Int32 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Int32 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Int32 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Int32 
Instance details

Defined in Data.Aeson.Types.ToJSON

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

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 () #

Bounded Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Enum Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Ix Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Num Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Read Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Integral Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Real Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

toRational :: Int32 -> Rational #

Show Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

showsPrec :: Int -> Int32 -> ShowS #

show :: Int32 -> String #

showList :: [Int32] -> ShowS #

BitOps Int32 
Instance details

Defined in Basement.Bits

FiniteBitsOps Int32 
Instance details

Defined in Basement.Bits

Subtractive Int32 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Int32 #

Methods

(-) :: Int32 -> Int32 -> Difference Int32 #

PrimMemoryComparable Int32 
Instance details

Defined in Basement.PrimType

PrimType Int32 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Int32 :: Nat #

ToMarkup Int32 
Instance details

Defined in Text.Blaze

ToValue Int32 
Instance details

Defined in Text.Blaze

Default Int32 
Instance details

Defined in Data.Default.Class

Methods

def :: Int32 #

NFData Int32 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int32 -> () #

ToLogStr Int32

Since: fast-logger-2.4.14

Instance details

Defined in System.Log.FastLogger.LogStr

Methods

toLogStr :: Int32 -> LogStr #

Eq Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

(==) :: Int32 -> Int32 -> Bool #

(/=) :: Int32 -> Int32 -> Bool #

Ord Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

compare :: Int32 -> Int32 -> Ordering #

(<) :: Int32 -> Int32 -> Bool #

(<=) :: Int32 -> Int32 -> Bool #

(>) :: Int32 -> Int32 -> Bool #

(>=) :: Int32 -> Int32 -> Bool #

max :: Int32 -> Int32 -> Int32 #

min :: Int32 -> Int32 -> Int32 #

Hashable Int32 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int32 -> Int #

hash :: Int32 -> Int #

FromHttpApiData Int32 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Int32 
Instance details

Defined in Web.Internal.HttpApiData

PathPiece Int32 
Instance details

Defined in Web.PathPieces

PersistField Int32 
Instance details

Defined in Database.Persist.Class.PersistField

PersistFieldSql Int32 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Int32 -> SqlType #

Pretty Int32 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Int32 -> Doc ann #

prettyList :: [Int32] -> Doc ann #

Prim Int32 
Instance details

Defined in Data.Primitive.Types

FieldDefault Int32 
Instance details

Defined in Data.ProtoLens.Message

Uniform Int32 
Instance details

Defined in System.Random.Internal

Methods

uniformM :: StatefulGen g m => g -> m Int32 #

UniformRange Int32 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Int32, Int32) -> g -> m Int32 #

Unbox Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

Lift Int32 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Int32 -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Int32 -> Code m Int32 #

Vector Vector Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

HasField BatchOpenChannelRequest "minConfs" Int32 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "minConfs" -> (Int32 -> f Int32) -> BatchOpenChannelRequest -> f BatchOpenChannelRequest

HasField BatchOpenChannelRequest "targetConf" Int32 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "targetConf" -> (Int32 -> f Int32) -> BatchOpenChannelRequest -> f BatchOpenChannelRequest

HasField CloseChannelRequest "targetConf" Int32 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "targetConf" -> (Int32 -> f Int32) -> CloseChannelRequest -> f CloseChannelRequest

HasField ConfirmationUpdate "blockHeight" Int32 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "blockHeight" -> (Int32 -> f Int32) -> ConfirmationUpdate -> f ConfirmationUpdate

HasField EstimateFeeRequest "minConfs" Int32 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "minConfs" -> (Int32 -> f Int32) -> EstimateFeeRequest -> f EstimateFeeRequest

HasField EstimateFeeRequest "targetConf" Int32 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "targetConf" -> (Int32 -> f Int32) -> EstimateFeeRequest -> f EstimateFeeRequest

HasField GetTransactionsRequest "endHeight" Int32 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "endHeight" -> (Int32 -> f Int32) -> GetTransactionsRequest -> f GetTransactionsRequest

HasField GetTransactionsRequest "startHeight" Int32 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "startHeight" -> (Int32 -> f Int32) -> GetTransactionsRequest -> f GetTransactionsRequest

HasField ListUnspentRequest "maxConfs" Int32 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "maxConfs" -> (Int32 -> f Int32) -> ListUnspentRequest -> f ListUnspentRequest

HasField ListUnspentRequest "minConfs" Int32 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "minConfs" -> (Int32 -> f Int32) -> ListUnspentRequest -> f ListUnspentRequest

HasField OpenChannelRequest "minConfs" Int32 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "minConfs" -> (Int32 -> f Int32) -> OpenChannelRequest -> f OpenChannelRequest

HasField OpenChannelRequest "targetConf" Int32 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "targetConf" -> (Int32 -> f Int32) -> OpenChannelRequest -> f OpenChannelRequest

HasField Peer "flapCount" Int32 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "flapCount" -> (Int32 -> f Int32) -> Peer -> f Peer

HasField SendCoinsRequest "minConfs" Int32 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "minConfs" -> (Int32 -> f Int32) -> SendCoinsRequest -> f SendCoinsRequest

HasField SendCoinsRequest "targetConf" Int32 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "targetConf" -> (Int32 -> f Int32) -> SendCoinsRequest -> f SendCoinsRequest

HasField SendManyRequest "minConfs" Int32 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "minConfs" -> (Int32 -> f Int32) -> SendManyRequest -> f SendManyRequest

HasField SendManyRequest "targetConf" Int32 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "targetConf" -> (Int32 -> f Int32) -> SendManyRequest -> f SendManyRequest

HasField SendRequest "finalCltvDelta" Int32 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "finalCltvDelta" -> (Int32 -> f Int32) -> SendRequest -> f SendRequest

HasField Transaction "blockHeight" Int32 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "blockHeight" -> (Int32 -> f Int32) -> Transaction -> f Transaction

HasField Transaction "numConfirmations" Int32 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "numConfirmations" -> (Int32 -> f Int32) -> Transaction -> f Transaction

HasField KeyLocator "keyFamily" Int32 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "keyFamily" -> (Int32 -> f Int32) -> KeyLocator -> f KeyLocator

HasField KeyLocator "keyIndex" Int32 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "keyIndex" -> (Int32 -> f Int32) -> KeyLocator -> f KeyLocator

HasField PendingChannelsResponse'ForceClosedChannel "blocksTilMaturity" Int32 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "blocksTilMaturity" -> (Int32 -> f Int32) -> PendingChannelsResponse'ForceClosedChannel -> f PendingChannelsResponse'ForceClosedChannel

HasField PendingHTLC "blocksTilMaturity" Int32 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "blocksTilMaturity" -> (Int32 -> f Int32) -> PendingHTLC -> f PendingHTLC

HasField QueryRoutesRequest "finalCltvDelta" Int32 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "finalCltvDelta" -> (Int32 -> f Int32) -> QueryRoutesRequest -> f QueryRoutesRequest

HasField InvoiceHTLC "acceptHeight" Int32 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "acceptHeight" -> (Int32 -> f Int32) -> InvoiceHTLC -> f InvoiceHTLC

HasField InvoiceHTLC "expiryHeight" Int32 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "expiryHeight" -> (Int32 -> f Int32) -> InvoiceHTLC -> f InvoiceHTLC

HasField BuildRouteRequest "finalCltvDelta" Int32 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "finalCltvDelta" -> (Int32 -> f Int32) -> BuildRouteRequest -> f BuildRouteRequest

HasField SendPaymentRequest "cltvLimit" Int32 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "cltvLimit" -> (Int32 -> f Int32) -> SendPaymentRequest -> f SendPaymentRequest

HasField SendPaymentRequest "finalCltvDelta" Int32 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "finalCltvDelta" -> (Int32 -> f Int32) -> SendPaymentRequest -> f SendPaymentRequest

HasField SendPaymentRequest "timeoutSeconds" Int32 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "timeoutSeconds" -> (Int32 -> f Int32) -> SendPaymentRequest -> f SendPaymentRequest

HasField KeyLocator "keyFamily" Int32 
Instance details

Defined in Proto.Signrpc.Signer

Methods

fieldOf :: Functor f => Proxy# "keyFamily" -> (Int32 -> f Int32) -> KeyLocator -> f KeyLocator

HasField KeyLocator "keyIndex" Int32 
Instance details

Defined in Proto.Signrpc.Signer

Methods

fieldOf :: Functor f => Proxy# "keyIndex" -> (Int32 -> f Int32) -> KeyLocator -> f KeyLocator

HasField SignDescriptor "inputIndex" Int32 
Instance details

Defined in Proto.Signrpc.Signer

Methods

fieldOf :: Functor f => Proxy# "inputIndex" -> (Int32 -> f Int32) -> SignDescriptor -> f SignDescriptor

HasField EstimateFeeRequest "confTarget" Int32 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "confTarget" -> (Int32 -> f Int32) -> EstimateFeeRequest -> f EstimateFeeRequest

HasField FundPsbtRequest "minConfs" Int32 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "minConfs" -> (Int32 -> f Int32) -> FundPsbtRequest -> f FundPsbtRequest

HasField FundPsbtResponse "changeOutputIndex" Int32 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "changeOutputIndex" -> (Int32 -> f Int32) -> FundPsbtResponse -> f FundPsbtResponse

HasField KeyReq "keyFamily" Int32 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "keyFamily" -> (Int32 -> f Int32) -> KeyReq -> f KeyReq

HasField KeyReq "keyFingerPrint" Int32 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "keyFingerPrint" -> (Int32 -> f Int32) -> KeyReq -> f KeyReq

HasField ListUnspentRequest "maxConfs" Int32 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "maxConfs" -> (Int32 -> f Int32) -> ListUnspentRequest -> f ListUnspentRequest

HasField ListUnspentRequest "minConfs" Int32 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "minConfs" -> (Int32 -> f Int32) -> ListUnspentRequest -> f ListUnspentRequest

HasField SendOutputsRequest "minConfs" Int32 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "minConfs" -> (Int32 -> f Int32) -> SendOutputsRequest -> f SendOutputsRequest

HasField InitWalletRequest "recoveryWindow" Int32 
Instance details

Defined in Proto.Walletunlocker

Methods

fieldOf :: Functor f => Proxy# "recoveryWindow" -> (Int32 -> f Int32) -> InitWalletRequest -> f InitWalletRequest

HasField UnlockWalletRequest "recoveryWindow" Int32 
Instance details

Defined in Proto.Walletunlocker

Methods

fieldOf :: Functor f => Proxy# "recoveryWindow" -> (Int32 -> f Int32) -> UnlockWalletRequest -> f UnlockWalletRequest

type NatNumMaxBound Int32 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Int32 = 2147483647
type Difference Int32 
Instance details

Defined in Basement.Numerical.Subtractive

type PrimSize Int32 
Instance details

Defined in Basement.PrimType

type PrimSize Int32 = 4
newtype Vector Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

data Int64 #

64-bit signed integer type

Instances

Instances details
FromJSON Int64 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Int64 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Int64 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Int64 
Instance details

Defined in Data.Aeson.Types.ToJSON

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

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 () #

Bounded Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Enum Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Ix Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Num Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Read Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Integral Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Real Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

toRational :: Int64 -> Rational #

Show Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

showsPrec :: Int -> Int64 -> ShowS #

show :: Int64 -> String #

showList :: [Int64] -> ShowS #

BitOps Int64 
Instance details

Defined in Basement.Bits

FiniteBitsOps Int64 
Instance details

Defined in Basement.Bits

Subtractive Int64 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Int64 #

Methods

(-) :: Int64 -> Int64 -> Difference Int64 #

PrimMemoryComparable Int64 
Instance details

Defined in Basement.PrimType

PrimType Int64 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Int64 :: Nat #

ToMarkup Int64 
Instance details

Defined in Text.Blaze

ToValue Int64 
Instance details

Defined in Text.Blaze

Default Int64 
Instance details

Defined in Data.Default.Class

Methods

def :: Int64 #

NFData Int64 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int64 -> () #

ToLogStr Int64

Since: fast-logger-2.4.14

Instance details

Defined in System.Log.FastLogger.LogStr

Methods

toLogStr :: Int64 -> LogStr #

Eq Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

(==) :: Int64 -> Int64 -> Bool #

(/=) :: Int64 -> Int64 -> Bool #

Ord Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

compare :: Int64 -> Int64 -> Ordering #

(<) :: Int64 -> Int64 -> Bool #

(<=) :: Int64 -> Int64 -> Bool #

(>) :: Int64 -> Int64 -> Bool #

(>=) :: Int64 -> Int64 -> Bool #

max :: Int64 -> Int64 -> Int64 #

min :: Int64 -> Int64 -> Int64 #

Hashable Int64 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int64 -> Int #

hash :: Int64 -> Int #

FromHttpApiData Int64 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Int64 
Instance details

Defined in Web.Internal.HttpApiData

PathPiece Int64 
Instance details

Defined in Web.PathPieces

PersistField Int64 
Instance details

Defined in Database.Persist.Class.PersistField

PersistFieldSql Int64 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Int64 -> SqlType #

Pretty Int64 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Int64 -> Doc ann #

prettyList :: [Int64] -> Doc ann #

Prim Int64 
Instance details

Defined in Data.Primitive.Types

FieldDefault Int64 
Instance details

Defined in Data.ProtoLens.Message

Uniform Int64 
Instance details

Defined in System.Random.Internal

Methods

uniformM :: StatefulGen g m => g -> m Int64 #

UniformRange Int64 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Int64, Int64) -> g -> m Int64 #

Unbox Int64 
Instance details

Defined in Data.Vector.Unboxed.Base

FromGrpc Seconds Int64 
Instance details

Defined in LndClient.Data.Newtype

Methods

fromGrpc :: Int64 -> Either LndError Seconds

ToGrpc Seconds Int64 
Instance details

Defined in LndClient.Data.Newtype

Methods

toGrpc :: Seconds -> Either LndError Int64

Lift Int64 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Int64 -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Int64 -> Code m Int64 #

Scaling Timespan Int64 
Instance details

Defined in Chronos

Methods

scale :: Int64 -> Timespan -> Timespan #

Vector Vector Int64 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Int64 
Instance details

Defined in Data.Vector.Unboxed.Base

From Int64 RowQty Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Int64 -> RowQty

From RowQty Int64 Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: RowQty -> Int64

HasField AddHoldInvoiceRequest "expiry" Int64 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

fieldOf :: Functor f => Proxy# "expiry" -> (Int64 -> f Int64) -> AddHoldInvoiceRequest -> f AddHoldInvoiceRequest

HasField AddHoldInvoiceRequest "value" Int64 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

fieldOf :: Functor f => Proxy# "value" -> (Int64 -> f Int64) -> AddHoldInvoiceRequest -> f AddHoldInvoiceRequest

HasField AddHoldInvoiceRequest "valueMsat" Int64 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

fieldOf :: Functor f => Proxy# "valueMsat" -> (Int64 -> f Int64) -> AddHoldInvoiceRequest -> f AddHoldInvoiceRequest

HasField BatchOpenChannel "localFundingAmount" Int64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "localFundingAmount" -> (Int64 -> f Int64) -> BatchOpenChannel -> f BatchOpenChannel

HasField BatchOpenChannel "minHtlcMsat" Int64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "minHtlcMsat" -> (Int64 -> f Int64) -> BatchOpenChannel -> f BatchOpenChannel

HasField BatchOpenChannel "pushSat" Int64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "pushSat" -> (Int64 -> f Int64) -> BatchOpenChannel -> f BatchOpenChannel

HasField BatchOpenChannelRequest "satPerVbyte" Int64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "satPerVbyte" -> (Int64 -> f Int64) -> BatchOpenChannelRequest -> f BatchOpenChannelRequest

HasField CloseChannelRequest "satPerByte" Int64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "satPerByte" -> (Int64 -> f Int64) -> CloseChannelRequest -> f CloseChannelRequest

HasField EstimateFeeRequest'AddrToAmountEntry "value" Int64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "value" -> (Int64 -> f Int64) -> EstimateFeeRequest'AddrToAmountEntry -> f EstimateFeeRequest'AddrToAmountEntry

HasField EstimateFeeResponse "feeSat" Int64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "feeSat" -> (Int64 -> f Int64) -> EstimateFeeResponse -> f EstimateFeeResponse

HasField EstimateFeeResponse "feerateSatPerByte" Int64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "feerateSatPerByte" -> (Int64 -> f Int64) -> EstimateFeeResponse -> f EstimateFeeResponse

HasField GetInfoResponse "bestHeaderTimestamp" Int64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "bestHeaderTimestamp" -> (Int64 -> f Int64) -> GetInfoResponse -> f GetInfoResponse

HasField OpenChannelRequest "localFundingAmount" Int64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "localFundingAmount" -> (Int64 -> f Int64) -> OpenChannelRequest -> f OpenChannelRequest

HasField OpenChannelRequest "minHtlcMsat" Int64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "minHtlcMsat" -> (Int64 -> f Int64) -> OpenChannelRequest -> f OpenChannelRequest

HasField OpenChannelRequest "pushSat" Int64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "pushSat" -> (Int64 -> f Int64) -> OpenChannelRequest -> f OpenChannelRequest

HasField OpenChannelRequest "satPerByte" Int64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "satPerByte" -> (Int64 -> f Int64) -> OpenChannelRequest -> f OpenChannelRequest

HasField Peer "lastFlapNs" Int64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "lastFlapNs" -> (Int64 -> f Int64) -> Peer -> f Peer

HasField Peer "pingTime" Int64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "pingTime" -> (Int64 -> f Int64) -> Peer -> f Peer

HasField Peer "satRecv" Int64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "satRecv" -> (Int64 -> f Int64) -> Peer -> f Peer

HasField Peer "satSent" Int64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "satSent" -> (Int64 -> f Int64) -> Peer -> f Peer

HasField ReadyForPsbtFunding "fundingAmount" Int64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "fundingAmount" -> (Int64 -> f Int64) -> ReadyForPsbtFunding -> f ReadyForPsbtFunding

HasField SendCoinsRequest "amount" Int64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "amount" -> (Int64 -> f Int64) -> SendCoinsRequest -> f SendCoinsRequest

HasField SendCoinsRequest "satPerByte" Int64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "satPerByte" -> (Int64 -> f Int64) -> SendCoinsRequest -> f SendCoinsRequest

HasField SendManyRequest "satPerByte" Int64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "satPerByte" -> (Int64 -> f Int64) -> SendManyRequest -> f SendManyRequest

HasField SendManyRequest'AddrToAmountEntry "value" Int64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "value" -> (Int64 -> f Int64) -> SendManyRequest'AddrToAmountEntry -> f SendManyRequest'AddrToAmountEntry

HasField SendRequest "amt" Int64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "amt" -> (Int64 -> f Int64) -> SendRequest -> f SendRequest

HasField SendRequest "amtMsat" Int64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "amtMsat" -> (Int64 -> f Int64) -> SendRequest -> f SendRequest

HasField Transaction "amount" Int64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "amount" -> (Int64 -> f Int64) -> Transaction -> f Transaction

HasField Transaction "timeStamp" Int64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "timeStamp" -> (Int64 -> f Int64) -> Transaction -> f Transaction

HasField Transaction "totalFees" Int64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "totalFees" -> (Int64 -> f Int64) -> Transaction -> f Transaction

HasField Utxo "amountSat" Int64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "amountSat" -> (Int64 -> f Int64) -> Utxo -> f Utxo

HasField Utxo "confirmations" Int64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "confirmations" -> (Int64 -> f Int64) -> Utxo -> f Utxo

HasField ChanPointShim "amt" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "amt" -> (Int64 -> f Int64) -> ChanPointShim -> f ChanPointShim

HasField Channel "capacity" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "capacity" -> (Int64 -> f Int64) -> Channel -> f Channel

HasField Channel "commitFee" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "commitFee" -> (Int64 -> f Int64) -> Channel -> f Channel

HasField Channel "commitWeight" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "commitWeight" -> (Int64 -> f Int64) -> Channel -> f Channel

HasField Channel "feePerKw" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "feePerKw" -> (Int64 -> f Int64) -> Channel -> f Channel

HasField Channel "lifetime" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "lifetime" -> (Int64 -> f Int64) -> Channel -> f Channel

HasField Channel "localBalance" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "localBalance" -> (Int64 -> f Int64) -> Channel -> f Channel

HasField Channel "localChanReserveSat" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "localChanReserveSat" -> (Int64 -> f Int64) -> Channel -> f Channel

HasField Channel "remoteBalance" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "remoteBalance" -> (Int64 -> f Int64) -> Channel -> f Channel

HasField Channel "remoteChanReserveSat" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "remoteChanReserveSat" -> (Int64 -> f Int64) -> Channel -> f Channel

HasField Channel "totalSatoshisReceived" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "totalSatoshisReceived" -> (Int64 -> f Int64) -> Channel -> f Channel

HasField Channel "totalSatoshisSent" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "totalSatoshisSent" -> (Int64 -> f Int64) -> Channel -> f Channel

HasField Channel "unsettledBalance" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "unsettledBalance" -> (Int64 -> f Int64) -> Channel -> f Channel

HasField Channel "uptime" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "uptime" -> (Int64 -> f Int64) -> Channel -> f Channel

HasField ChannelBalanceResponse "balance" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "balance" -> (Int64 -> f Int64) -> ChannelBalanceResponse -> f ChannelBalanceResponse

HasField ChannelBalanceResponse "pendingOpenBalance" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "pendingOpenBalance" -> (Int64 -> f Int64) -> ChannelBalanceResponse -> f ChannelBalanceResponse

HasField ChannelCloseSummary "capacity" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "capacity" -> (Int64 -> f Int64) -> ChannelCloseSummary -> f ChannelCloseSummary

HasField ChannelCloseSummary "settledBalance" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "settledBalance" -> (Int64 -> f Int64) -> ChannelCloseSummary -> f ChannelCloseSummary

HasField ChannelCloseSummary "timeLockedBalance" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "timeLockedBalance" -> (Int64 -> f Int64) -> ChannelCloseSummary -> f ChannelCloseSummary

HasField ChannelEdge "capacity" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "capacity" -> (Int64 -> f Int64) -> ChannelEdge -> f ChannelEdge

HasField ChannelEdgeUpdate "capacity" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "capacity" -> (Int64 -> f Int64) -> ChannelEdgeUpdate -> f ChannelEdgeUpdate

HasField ClosedChannelUpdate "capacity" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "capacity" -> (Int64 -> f Int64) -> ClosedChannelUpdate -> f ClosedChannelUpdate

HasField FeeLimit "fixed" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "fixed" -> (Int64 -> f Int64) -> FeeLimit -> f FeeLimit

HasField FeeLimit "fixedMsat" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "fixedMsat" -> (Int64 -> f Int64) -> FeeLimit -> f FeeLimit

HasField FeeLimit "percent" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "percent" -> (Int64 -> f Int64) -> FeeLimit -> f FeeLimit

HasField HTLC "amount" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "amount" -> (Int64 -> f Int64) -> HTLC -> f HTLC

HasField Hop "amtToForward" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "amtToForward" -> (Int64 -> f Int64) -> Hop -> f Hop

HasField Hop "amtToForwardMsat" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "amtToForwardMsat" -> (Int64 -> f Int64) -> Hop -> f Hop

HasField Hop "chanCapacity" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "chanCapacity" -> (Int64 -> f Int64) -> Hop -> f Hop

HasField Hop "fee" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "fee" -> (Int64 -> f Int64) -> Hop -> f Hop

HasField Hop "feeMsat" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "feeMsat" -> (Int64 -> f Int64) -> Hop -> f Hop

HasField MPPRecord "totalAmtMsat" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "totalAmtMsat" -> (Int64 -> f Int64) -> MPPRecord -> f MPPRecord

HasField NetworkInfo "maxChannelSize" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "maxChannelSize" -> (Int64 -> f Int64) -> NetworkInfo -> f NetworkInfo

HasField NetworkInfo "medianChannelSizeSat" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "medianChannelSizeSat" -> (Int64 -> f Int64) -> NetworkInfo -> f NetworkInfo

HasField NetworkInfo "minChannelSize" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "minChannelSize" -> (Int64 -> f Int64) -> NetworkInfo -> f NetworkInfo

HasField NetworkInfo "totalNetworkCapacity" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "totalNetworkCapacity" -> (Int64 -> f Int64) -> NetworkInfo -> f NetworkInfo

HasField NodeInfo "totalCapacity" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "totalCapacity" -> (Int64 -> f Int64) -> NodeInfo -> f NodeInfo

HasField PendingChannelsResponse "totalLimboBalance" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "totalLimboBalance" -> (Int64 -> f Int64) -> PendingChannelsResponse -> f PendingChannelsResponse

HasField PendingChannelsResponse'ForceClosedChannel "limboBalance" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "limboBalance" -> (Int64 -> f Int64) -> PendingChannelsResponse'ForceClosedChannel -> f PendingChannelsResponse'ForceClosedChannel

HasField PendingChannelsResponse'ForceClosedChannel "recoveredBalance" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "recoveredBalance" -> (Int64 -> f Int64) -> PendingChannelsResponse'ForceClosedChannel -> f PendingChannelsResponse'ForceClosedChannel

HasField PendingChannelsResponse'PendingChannel "capacity" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "capacity" -> (Int64 -> f Int64) -> PendingChannelsResponse'PendingChannel -> f PendingChannelsResponse'PendingChannel

HasField PendingChannelsResponse'PendingChannel "localBalance" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "localBalance" -> (Int64 -> f Int64) -> PendingChannelsResponse'PendingChannel -> f PendingChannelsResponse'PendingChannel

HasField PendingChannelsResponse'PendingChannel "localChanReserveSat" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "localChanReserveSat" -> (Int64 -> f Int64) -> PendingChannelsResponse'PendingChannel -> f PendingChannelsResponse'PendingChannel

HasField PendingChannelsResponse'PendingChannel "numForwardingPackages" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "numForwardingPackages" -> (Int64 -> f Int64) -> PendingChannelsResponse'PendingChannel -> f PendingChannelsResponse'PendingChannel

HasField PendingChannelsResponse'PendingChannel "remoteBalance" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "remoteBalance" -> (Int64 -> f Int64) -> PendingChannelsResponse'PendingChannel -> f PendingChannelsResponse'PendingChannel

HasField PendingChannelsResponse'PendingChannel "remoteChanReserveSat" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "remoteChanReserveSat" -> (Int64 -> f Int64) -> PendingChannelsResponse'PendingChannel -> f PendingChannelsResponse'PendingChannel

HasField PendingChannelsResponse'PendingOpenChannel "commitFee" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "commitFee" -> (Int64 -> f Int64) -> PendingChannelsResponse'PendingOpenChannel -> f PendingChannelsResponse'PendingOpenChannel

HasField PendingChannelsResponse'PendingOpenChannel "commitWeight" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "commitWeight" -> (Int64 -> f Int64) -> PendingChannelsResponse'PendingOpenChannel -> f PendingChannelsResponse'PendingOpenChannel

HasField PendingChannelsResponse'PendingOpenChannel "feePerKw" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "feePerKw" -> (Int64 -> f Int64) -> PendingChannelsResponse'PendingOpenChannel -> f PendingChannelsResponse'PendingOpenChannel

HasField PendingChannelsResponse'WaitingCloseChannel "limboBalance" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "limboBalance" -> (Int64 -> f Int64) -> PendingChannelsResponse'WaitingCloseChannel -> f PendingChannelsResponse'WaitingCloseChannel

HasField PendingHTLC "amount" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "amount" -> (Int64 -> f Int64) -> PendingHTLC -> f PendingHTLC

HasField QueryRoutesRequest "amt" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "amt" -> (Int64 -> f Int64) -> QueryRoutesRequest -> f QueryRoutesRequest

HasField QueryRoutesRequest "amtMsat" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "amtMsat" -> (Int64 -> f Int64) -> QueryRoutesRequest -> f QueryRoutesRequest

HasField Route "totalAmt" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "totalAmt" -> (Int64 -> f Int64) -> Route -> f Route

HasField Route "totalAmtMsat" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "totalAmtMsat" -> (Int64 -> f Int64) -> Route -> f Route

HasField Route "totalFees" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "totalFees" -> (Int64 -> f Int64) -> Route -> f Route

HasField Route "totalFeesMsat" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "totalFeesMsat" -> (Int64 -> f Int64) -> Route -> f Route

HasField RoutingPolicy "feeBaseMsat" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "feeBaseMsat" -> (Int64 -> f Int64) -> RoutingPolicy -> f RoutingPolicy

HasField RoutingPolicy "feeRateMilliMsat" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "feeRateMilliMsat" -> (Int64 -> f Int64) -> RoutingPolicy -> f RoutingPolicy

HasField RoutingPolicy "minHtlc" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "minHtlc" -> (Int64 -> f Int64) -> RoutingPolicy -> f RoutingPolicy

HasField WalletAccountBalance "confirmedBalance" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "confirmedBalance" -> (Int64 -> f Int64) -> WalletAccountBalance -> f WalletAccountBalance

HasField WalletAccountBalance "unconfirmedBalance" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "unconfirmedBalance" -> (Int64 -> f Int64) -> WalletAccountBalance -> f WalletAccountBalance

HasField WalletBalanceResponse "confirmedBalance" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "confirmedBalance" -> (Int64 -> f Int64) -> WalletBalanceResponse -> f WalletBalanceResponse

HasField WalletBalanceResponse "totalBalance" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "totalBalance" -> (Int64 -> f Int64) -> WalletBalanceResponse -> f WalletBalanceResponse

HasField WalletBalanceResponse "unconfirmedBalance" Int64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "unconfirmedBalance" -> (Int64 -> f Int64) -> WalletBalanceResponse -> f WalletBalanceResponse

HasField AMPInvoiceState "amtPaidMsat" Int64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "amtPaidMsat" -> (Int64 -> f Int64) -> AMPInvoiceState -> f AMPInvoiceState

HasField AMPInvoiceState "settleTime" Int64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "settleTime" -> (Int64 -> f Int64) -> AMPInvoiceState -> f AMPInvoiceState

HasField ChannelFeeReport "baseFeeMsat" Int64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "baseFeeMsat" -> (Int64 -> f Int64) -> ChannelFeeReport -> f ChannelFeeReport

HasField ChannelFeeReport "feePerMil" Int64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "feePerMil" -> (Int64 -> f Int64) -> ChannelFeeReport -> f ChannelFeeReport

HasField HTLCAttempt "attemptTimeNs" Int64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "attemptTimeNs" -> (Int64 -> f Int64) -> HTLCAttempt -> f HTLCAttempt

HasField HTLCAttempt "resolveTimeNs" Int64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "resolveTimeNs" -> (Int64 -> f Int64) -> HTLCAttempt -> f HTLCAttempt

HasField Invoice "amtPaid" Int64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "amtPaid" -> (Int64 -> f Int64) -> Invoice -> f Invoice

HasField Invoice "amtPaidMsat" Int64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "amtPaidMsat" -> (Int64 -> f Int64) -> Invoice -> f Invoice

HasField Invoice "amtPaidSat" Int64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "amtPaidSat" -> (Int64 -> f Int64) -> Invoice -> f Invoice

HasField Invoice "creationDate" Int64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "creationDate" -> (Int64 -> f Int64) -> Invoice -> f Invoice

HasField Invoice "expiry" Int64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "expiry" -> (Int64 -> f Int64) -> Invoice -> f Invoice

HasField Invoice "settleDate" Int64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "settleDate" -> (Int64 -> f Int64) -> Invoice -> f Invoice

HasField Invoice "value" Int64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "value" -> (Int64 -> f Int64) -> Invoice -> f Invoice

HasField Invoice "valueMsat" Int64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "valueMsat" -> (Int64 -> f Int64) -> Invoice -> f Invoice

HasField InvoiceHTLC "acceptTime" Int64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "acceptTime" -> (Int64 -> f Int64) -> InvoiceHTLC -> f InvoiceHTLC

HasField InvoiceHTLC "resolveTime" Int64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "resolveTime" -> (Int64 -> f Int64) -> InvoiceHTLC -> f InvoiceHTLC

HasField PayReq "cltvExpiry" Int64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "cltvExpiry" -> (Int64 -> f Int64) -> PayReq -> f PayReq

HasField PayReq "expiry" Int64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "expiry" -> (Int64 -> f Int64) -> PayReq -> f PayReq

HasField PayReq "numMsat" Int64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "numMsat" -> (Int64 -> f Int64) -> PayReq -> f PayReq

HasField PayReq "numSatoshis" Int64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "numSatoshis" -> (Int64 -> f Int64) -> PayReq -> f PayReq

HasField PayReq "timestamp" Int64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "timestamp" -> (Int64 -> f Int64) -> PayReq -> f PayReq

HasField Payment "creationDate" Int64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "creationDate" -> (Int64 -> f Int64) -> Payment -> f Payment

HasField Payment "creationTimeNs" Int64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "creationTimeNs" -> (Int64 -> f Int64) -> Payment -> f Payment

HasField Payment "fee" Int64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "fee" -> (Int64 -> f Int64) -> Payment -> f Payment

HasField Payment "feeMsat" Int64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "feeMsat" -> (Int64 -> f Int64) -> Payment -> f Payment

HasField Payment "feeSat" Int64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "feeSat" -> (Int64 -> f Int64) -> Payment -> f Payment

HasField Payment "value" Int64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "value" -> (Int64 -> f Int64) -> Payment -> f Payment

HasField Payment "valueMsat" Int64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "valueMsat" -> (Int64 -> f Int64) -> Payment -> f Payment

HasField Payment "valueSat" Int64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "valueSat" -> (Int64 -> f Int64) -> Payment -> f Payment

HasField PolicyUpdateRequest "baseFeeMsat" Int64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "baseFeeMsat" -> (Int64 -> f Int64) -> PolicyUpdateRequest -> f PolicyUpdateRequest

HasField BuildRouteRequest "amtMsat" Int64 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "amtMsat" -> (Int64 -> f Int64) -> BuildRouteRequest -> f BuildRouteRequest

HasField PairData "failAmtMsat" Int64 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "failAmtMsat" -> (Int64 -> f Int64) -> PairData -> f PairData

HasField PairData "failAmtSat" Int64 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "failAmtSat" -> (Int64 -> f Int64) -> PairData -> f PairData

HasField PairData "failTime" Int64 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "failTime" -> (Int64 -> f Int64) -> PairData -> f PairData

HasField PairData "successAmtMsat" Int64 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "successAmtMsat" -> (Int64 -> f Int64) -> PairData -> f PairData

HasField PairData "successAmtSat" Int64 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "successAmtSat" -> (Int64 -> f Int64) -> PairData -> f PairData

HasField PairData "successTime" Int64 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "successTime" -> (Int64 -> f Int64) -> PairData -> f PairData

HasField QueryProbabilityRequest "amtMsat" Int64 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "amtMsat" -> (Int64 -> f Int64) -> QueryProbabilityRequest -> f QueryProbabilityRequest

HasField RouteFeeRequest "amtSat" Int64 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "amtSat" -> (Int64 -> f Int64) -> RouteFeeRequest -> f RouteFeeRequest

HasField RouteFeeResponse "routingFeeMsat" Int64 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "routingFeeMsat" -> (Int64 -> f Int64) -> RouteFeeResponse -> f RouteFeeResponse

HasField RouteFeeResponse "timeLockDelay" Int64 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "timeLockDelay" -> (Int64 -> f Int64) -> RouteFeeResponse -> f RouteFeeResponse

HasField SendPaymentRequest "amt" Int64 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "amt" -> (Int64 -> f Int64) -> SendPaymentRequest -> f SendPaymentRequest

HasField SendPaymentRequest "amtMsat" Int64 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "amtMsat" -> (Int64 -> f Int64) -> SendPaymentRequest -> f SendPaymentRequest

HasField SendPaymentRequest "feeLimitMsat" Int64 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "feeLimitMsat" -> (Int64 -> f Int64) -> SendPaymentRequest -> f SendPaymentRequest

HasField SendPaymentRequest "feeLimitSat" Int64 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "feeLimitSat" -> (Int64 -> f Int64) -> SendPaymentRequest -> f SendPaymentRequest

HasField TxOut "value" Int64 
Instance details

Defined in Proto.Signrpc.Signer

Methods

fieldOf :: Functor f => Proxy# "value" -> (Int64 -> f Int64) -> TxOut -> f TxOut

HasField EstimateFeeResponse "satPerKw" Int64 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "satPerKw" -> (Int64 -> f Int64) -> EstimateFeeResponse -> f EstimateFeeResponse

HasField SendOutputsRequest "satPerKw" Int64 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "satPerKw" -> (Int64 -> f Int64) -> SendOutputsRequest -> f SendOutputsRequest

HasField FeeLimit "maybe'fixed" (Maybe Int64) 
Instance details

Defined in Proto.Lnrpc.Ln0

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.Lnrpc.Ln0

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.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "maybe'percent" -> (Maybe Int64 -> f (Maybe Int64)) -> FeeLimit -> f FeeLimit

HasField EstimateFeeRequest "addrToAmount" (Map Text Int64) 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "addrToAmount" -> (Map Text Int64 -> f (Map Text Int64)) -> EstimateFeeRequest -> f EstimateFeeRequest

HasField SendManyRequest "addrToAmount" (Map Text Int64) 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "addrToAmount" -> (Map Text Int64 -> f (Map Text Int64)) -> SendManyRequest -> f SendManyRequest

type NatNumMaxBound Int64 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Int64 = 9223372036854775807
type Difference Int64 
Instance details

Defined in Basement.Numerical.Subtractive

type PrimSize Int64 
Instance details

Defined in Basement.PrimType

type PrimSize Int64 = 8
newtype Vector Int64 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Int64 
Instance details

Defined in Data.Vector.Unboxed.Base

data Integer #

Arbitrary precision integers. In contrast with fixed-size integral types such as Int, the Integer type represents the entire infinite range of integers.

Integers are stored in a kind of sign-magnitude form, hence do not expect two's complement form when using bit operations.

If the value is small (fit into an Int), IS constructor is used. Otherwise IP and IN constructors are used to store a BigNat representing respectively the positive or the negative value magnitude.

Invariant: IP and IN are used iff value doesn't fit in IS

Instances

Instances details
Out Rational 
Instance details

Defined in Text.PrettyPrint.GenericPretty

Methods

docPrec :: Int -> Rational -> Doc #

doc :: Rational -> Doc #

docList :: [Rational] -> Doc #

Out Integer 
Instance details

Defined in Text.PrettyPrint.GenericPretty

Methods

docPrec :: Int -> Integer -> Doc #

doc :: Integer -> Doc #

docList :: [Integer] -> Doc #

FromJSON Integer

This instance includes a bounds check to prevent maliciously large inputs to fill up the memory of the target system. You can newtype Scientific and provide your own instance using withScientific if you want to allow larger inputs.

Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Integer 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Integer 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Integer 
Instance details

Defined in Data.Aeson.Types.ToJSON

Bits Integer

Since: base-2.1

Instance details

Defined in Data.Bits

Enum Integer

Since: base-2.1

Instance details

Defined in GHC.Enum

Num Integer

Since: base-2.1

Instance details

Defined in GHC.Num

Read Integer

Since: base-2.1

Instance details

Defined in GHC.Read

Integral Integer

Since: base-2.0.1

Instance details

Defined in GHC.Real

Real Integer

Since: base-2.0.1

Instance details

Defined in GHC.Real

Show Integer

Since: base-2.1

Instance details

Defined in GHC.Show

Subtractive Integer 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Integer #

ToMarkup Integer 
Instance details

Defined in Text.Blaze

ToValue Integer 
Instance details

Defined in Text.Blaze

Default Integer 
Instance details

Defined in Data.Default.Class

Methods

def :: Integer #

NFData Integer 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Integer -> () #

ToLogStr Integer

Since: fast-logger-2.4.14

Instance details

Defined in System.Log.FastLogger.LogStr

Methods

toLogStr :: Integer -> LogStr #

Eq Integer 
Instance details

Defined in GHC.Num.Integer

Methods

(==) :: Integer -> Integer -> Bool #

(/=) :: Integer -> Integer -> Bool #

Ord Integer 
Instance details

Defined in GHC.Num.Integer

Hashable Integer 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Integer -> Int #

hash :: Integer -> Int #

FromHttpApiData Integer 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Integer 
Instance details

Defined in Web.Internal.HttpApiData

PathPiece Integer 
Instance details

Defined in Web.PathPieces

PersistField Rational 
Instance details

Defined in Database.Persist.Class.PersistField

PersistFieldSql Rational 
Instance details

Defined in Database.Persist.Sql.Class

Pretty Integer
>>> pretty (2^123 :: Integer)
10633823966279326983230456482242756608
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Integer -> Doc ann #

prettyList :: [Integer] -> Doc ann #

UniformRange Integer 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Integer, Integer) -> g -> m Integer #

Lift Integer 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Integer -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Integer -> Code m Integer #

From BlkHeight BlockHeight Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: BlkHeight -> BlockHeight

From FeeRate Rational Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: FeeRate -> Rational

TryFrom Rational FeeRate Source # 
Instance details

Defined in BtcLsp.Data.Type

TryFrom BlockHeight BlkHeight Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

tryFrom :: BlockHeight -> Either (TryFromException BlockHeight BlkHeight) BlkHeight

TryFrom Integer (Vout 'Funding) Source # 
Instance details

Defined in BtcLsp.Data.Orphan

TryFrom Rational (Money owner btcl mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

tryFrom :: Rational -> Either (TryFromException Rational (Money owner btcl mrel)) (Money owner btcl mrel)

From (Money owner btcl mrel) Rational Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Money owner btcl mrel -> Rational

type Difference Integer 
Instance details

Defined in Basement.Numerical.Subtractive

data Natural #

Natural number

Invariant: numbers <= 0xffffffffffffffff use the NS constructor

Instances

Instances details
Out Natural Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Methods

docPrec :: Int -> Natural -> Doc #

doc :: Natural -> Doc #

docList :: [Natural] -> Doc #

FromJSON Natural 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Natural 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Natural 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Natural 
Instance details

Defined in Data.Aeson.Types.ToJSON

Bits Natural

Since: base-4.8.0

Instance details

Defined in Data.Bits

Enum Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Enum

Num Natural

Note that Natural's Num instance isn't a ring: no element but 0 has an additive inverse. It is a semiring though.

Since: base-4.8.0.0

Instance details

Defined in GHC.Num

Read Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Read

Integral Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Real

Real Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Real

Show Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Show

Subtractive Natural 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Natural #

ToMarkup Natural 
Instance details

Defined in Text.Blaze

NFData Natural

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Natural -> () #

Eq Natural 
Instance details

Defined in GHC.Num.Natural

Methods

(==) :: Natural -> Natural -> Bool #

(/=) :: Natural -> Natural -> Bool #

Ord Natural 
Instance details

Defined in GHC.Num.Natural

Hashable Natural 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Natural -> Int #

hash :: Natural -> Int #

FromHttpApiData Natural 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Natural 
Instance details

Defined in Web.Internal.HttpApiData

(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

Pretty Natural 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Natural -> Doc ann #

prettyList :: [Natural] -> Doc ann #

UniformRange Natural 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Natural, Natural) -> g -> m Natural #

Lift Natural 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Natural -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Natural -> Code m Natural #

From BlkHeight Natural Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: BlkHeight -> Natural

From InQty Natural Source # 
Instance details

Defined in BtcLsp.Math.OnChain

Methods

from :: InQty -> Natural

From OutQty Natural Source # 
Instance details

Defined in BtcLsp.Math.OnChain

Methods

from :: OutQty -> Natural

From Natural InQty Source # 
Instance details

Defined in BtcLsp.Math.OnChain

Methods

from :: Natural -> InQty

From Natural OutQty Source # 
Instance details

Defined in BtcLsp.Math.OnChain

Methods

from :: Natural -> OutQty

From FeeRate (Ratio Natural) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: FeeRate -> Ratio Natural

From Vbyte (Ratio Natural) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Vbyte -> Ratio Natural

From SatPerVbyte (Ratio Natural) Source # 
Instance details

Defined in BtcLsp.Math.OnChain

ToBackendKey SqlBackend a => TryFrom Natural (Key a) Source # 
Instance details

Defined in BtcLsp.Data.Orphan

TryFrom Natural (Money owner btcl mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

tryFrom :: Natural -> Either (TryFromException Natural (Money owner btcl mrel)) (Money owner btcl mrel)

Out (Ratio Natural) Source # 
Instance details

Defined in BtcLsp.Data.Orphan

From (Ratio Natural) Vbyte Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Ratio Natural -> Vbyte

From (Ratio Natural) SatPerVbyte Source # 
Instance details

Defined in BtcLsp.Math.OnChain

ToBackendKey SqlBackend a => TryFrom (Key a) Natural Source # 
Instance details

Defined in BtcLsp.Data.Orphan

TryFrom (Ratio Natural) (Money owner btcl mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

tryFrom :: Ratio Natural -> Either (TryFromException (Ratio Natural) (Money owner btcl mrel)) (Money owner btcl mrel)

From (Money owner btcl mrel) Natural Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Money owner btcl mrel -> Natural

From (Money owner btcl mrel) (Ratio Natural) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Money owner btcl mrel -> Ratio Natural

type Difference Natural 
Instance details

Defined in Basement.Numerical.Subtractive

data Maybe a #

The Maybe type encapsulates an optional value. A value of type Maybe a either contains a value of type a (represented as Just a), or it is empty (represented as Nothing). Using Maybe is a good way to deal with errors or exceptional cases without resorting to drastic measures such as error.

The Maybe type is also a monad. It is a simple kind of error monad, where all errors are represented by Nothing. A richer error monad can be built using the Either type.

Constructors

Nothing 
Just a 

Instances

Instances details
FromJSON1 Maybe 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (Maybe a) #

liftParseJSONList :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [Maybe a] #

ToJSON1 Maybe 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Value) -> ([a] -> Value) -> Maybe a -> Value #

liftToJSONList :: (a -> Value) -> ([a] -> Value) -> [Maybe a] -> Value #

liftToEncoding :: (a -> Encoding) -> ([a] -> Encoding) -> Maybe a -> Encoding #

liftToEncodingList :: (a -> Encoding) -> ([a] -> Encoding) -> [Maybe a] -> Encoding #

MonadFail Maybe

Since: base-4.9.0.0

Instance details

Defined in Control.Monad.Fail

Methods

fail :: String -> Maybe a #

Foldable Maybe

Since: base-2.1

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Maybe m -> m #

foldMap :: Monoid m => (a -> m) -> Maybe a -> m #

foldMap' :: Monoid m => (a -> m) -> Maybe a -> m #

foldr :: (a -> b -> b) -> b -> Maybe a -> b #

foldr' :: (a -> b -> b) -> b -> Maybe a -> b #

foldl :: (b -> a -> b) -> b -> Maybe a -> b #

foldl' :: (b -> a -> b) -> b -> Maybe a -> b #

foldr1 :: (a -> a -> a) -> Maybe a -> a #

foldl1 :: (a -> a -> a) -> Maybe a -> a #

toList :: Maybe a -> [a] #

null :: Maybe a -> Bool #

length :: Maybe a -> Int #

elem :: Eq a => a -> Maybe a -> Bool #

maximum :: Ord a => Maybe a -> a #

minimum :: Ord a => Maybe a -> a #

sum :: Num a => Maybe a -> a #

product :: Num a => Maybe a -> a #

Eq1 Maybe

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftEq :: (a -> b -> Bool) -> Maybe a -> Maybe b -> Bool #

Ord1 Maybe

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftCompare :: (a -> b -> Ordering) -> Maybe a -> Maybe b -> Ordering #

Read1 Maybe

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (Maybe a) #

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [Maybe a] #

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (Maybe a) #

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [Maybe a] #

Show1 Maybe

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Maybe a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Maybe a] -> ShowS #

Traversable Maybe

Since: base-2.1

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Maybe a -> f (Maybe b) #

sequenceA :: Applicative f => Maybe (f a) -> f (Maybe a) #

mapM :: Monad m => (a -> m b) -> Maybe a -> m (Maybe b) #

sequence :: Monad m => Maybe (m a) -> m (Maybe a) #

Alternative Maybe

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

empty :: Maybe a #

(<|>) :: Maybe a -> Maybe a -> Maybe a #

some :: Maybe a -> Maybe [a] #

many :: Maybe a -> Maybe [a] #

Applicative Maybe

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

pure :: a -> Maybe a #

(<*>) :: Maybe (a -> b) -> Maybe a -> Maybe b #

liftA2 :: (a -> b -> c) -> Maybe a -> Maybe b -> Maybe c #

(*>) :: Maybe a -> Maybe b -> Maybe b #

(<*) :: Maybe a -> Maybe b -> Maybe a #

Functor Maybe

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

fmap :: (a -> b) -> Maybe a -> Maybe b #

(<$) :: a -> Maybe b -> Maybe a #

Monad Maybe

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

(>>=) :: Maybe a -> (a -> Maybe b) -> Maybe b #

(>>) :: Maybe a -> Maybe b -> Maybe b #

return :: a -> Maybe a #

MonadPlus Maybe

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

mzero :: Maybe a #

mplus :: Maybe a -> Maybe a -> Maybe a #

MonadFailure Maybe 
Instance details

Defined in Basement.Monad

Associated Types

type Failure Maybe #

Methods

mFail :: Failure Maybe -> Maybe () #

NFData1 Maybe

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> Maybe a -> () #

MonadThrow Maybe 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> Maybe a #

Hashable1 Maybe 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> Maybe a -> Int #

FoldableWithKey Maybe 
Instance details

Defined in Data.Key

Methods

toKeyedList :: Maybe a -> [(Key Maybe, a)] #

foldMapWithKey :: Monoid m => (Key Maybe -> a -> m) -> Maybe a -> m #

foldrWithKey :: (Key Maybe -> a -> b -> b) -> b -> Maybe a -> b #

foldlWithKey :: (b -> Key Maybe -> a -> b) -> b -> Maybe a -> b #

Indexable Maybe 
Instance details

Defined in Data.Key

Methods

index :: Maybe a -> Key Maybe -> a #

Keyed Maybe 
Instance details

Defined in Data.Key

Methods

mapWithKey :: (Key Maybe -> a -> b) -> Maybe a -> Maybe b #

Lookup Maybe 
Instance details

Defined in Data.Key

Methods

lookup :: Key Maybe -> Maybe a -> Maybe a #

TraversableWithKey Maybe 
Instance details

Defined in Data.Key

Methods

traverseWithKey :: Applicative f => (Key Maybe -> a -> f b) -> Maybe a -> f (Maybe b) #

mapWithKeyM :: Monad m => (Key Maybe -> a -> m b) -> Maybe a -> m (Maybe b) #

Zip Maybe 
Instance details

Defined in Data.Key

Methods

zipWith :: (a -> b -> c) -> Maybe a -> Maybe b -> Maybe c #

zip :: Maybe a -> Maybe b -> Maybe (a, b) #

zap :: Maybe (a -> b) -> Maybe a -> Maybe b #

ZipWithKey Maybe 
Instance details

Defined in Data.Key

Methods

zipWithKey :: (Key Maybe -> a -> b -> c) -> Maybe a -> Maybe b -> Maybe c #

zapWithKey :: Maybe (Key Maybe -> a -> b) -> Maybe a -> Maybe b #

Apply Maybe 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(<.>) :: Maybe (a -> b) -> Maybe a -> Maybe b #

(.>) :: Maybe a -> Maybe b -> Maybe b #

(<.) :: Maybe a -> Maybe b -> Maybe a #

liftF2 :: (a -> b -> c) -> Maybe a -> Maybe b -> Maybe c #

Bind Maybe 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(>>-) :: Maybe a -> (a -> Maybe b) -> Maybe b #

join :: Maybe (Maybe a) -> Maybe a #

MonadBaseControl Maybe Maybe 
Instance details

Defined in Control.Monad.Trans.Control

Associated Types

type StM Maybe a #

MonadError () Maybe

Since: mtl-2.2.2

Instance details

Defined in Control.Monad.Error.Class

Methods

throwError :: () -> Maybe a #

catchError :: Maybe a -> (() -> Maybe a) -> Maybe a #

(Selector s, GToJSON' enc arity (K1 i (Maybe a) :: Type -> 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

SymbolToField "bak" LnChan (Maybe SingleChanBackupBlob) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Methods

symbolToField :: EntityField LnChan (Maybe SingleChanBackupBlob) #

SymbolToField "closingTxId" LnChan (Maybe (TxId 'Closing)) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "extId" LnChan (Maybe ChanId) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "lockId" SwapUtxo (Maybe UtxoLockId) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "refundBlockId" SwapUtxo (Maybe BlockId) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "refundTxId" SwapUtxo (Maybe (TxId 'Funding)) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "swapIntoLnId" LnChan (Maybe SwapIntoLnId) Source # 
Instance details

Defined in BtcLsp.Storage.Model

HasField Ctx "maybe'lnPubKey" (Maybe LnPubKey) 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

fieldOf :: Functor f => Proxy# "maybe'lnPubKey" -> (Maybe LnPubKey -> f (Maybe LnPubKey)) -> Ctx -> f Ctx

HasField Ctx "maybe'nonce" (Maybe Nonce) 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

fieldOf :: Functor f => Proxy# "maybe'nonce" -> (Maybe Nonce -> f (Maybe Nonce)) -> Ctx -> f Ctx

HasField FeeMoney "maybe'val" (Maybe Msat) 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

fieldOf :: Functor f => Proxy# "maybe'val" -> (Maybe Msat -> f (Maybe Msat)) -> FeeMoney -> f FeeMoney

HasField FeeRate "maybe'val" (Maybe Urational) 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

fieldOf :: Functor f => Proxy# "maybe'val" -> (Maybe Urational -> f (Maybe Urational)) -> FeeRate -> f FeeRate

HasField FundLnHodlInvoice "maybe'val" (Maybe LnHodlInvoice) 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

HasField FundLnInvoice "maybe'val" (Maybe LnInvoice) 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

fieldOf :: Functor f => Proxy# "maybe'val" -> (Maybe LnInvoice -> f (Maybe LnInvoice)) -> FundLnInvoice -> f FundLnInvoice

HasField FundMoney "maybe'val" (Maybe Msat) 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

fieldOf :: Functor f => Proxy# "maybe'val" -> (Maybe Msat -> f (Maybe Msat)) -> FundMoney -> f FundMoney

HasField FundOnChainAddress "maybe'val" (Maybe OnChainAddress) 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

HasField InternalFailure "maybe'either" (Maybe InternalFailure'Either) 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

HasField InternalFailure "maybe'grpcServer" (Maybe Text) 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

fieldOf :: Functor f => Proxy# "maybe'grpcServer" -> (Maybe Text -> f (Maybe Text)) -> InternalFailure -> f InternalFailure

HasField InternalFailure "maybe'math" (Maybe Text) 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

fieldOf :: Functor f => Proxy# "maybe'math" -> (Maybe Text -> f (Maybe Text)) -> InternalFailure -> f InternalFailure

HasField InternalFailure "maybe'redacted" (Maybe Bool) 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

fieldOf :: Functor f => Proxy# "maybe'redacted" -> (Maybe Bool -> f (Maybe Bool)) -> InternalFailure -> f InternalFailure

HasField LnPeer "maybe'host" (Maybe LnHost) 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

fieldOf :: Functor f => Proxy# "maybe'host" -> (Maybe LnHost -> f (Maybe LnHost)) -> LnPeer -> f LnPeer

HasField LnPeer "maybe'port" (Maybe LnPort) 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

fieldOf :: Functor f => Proxy# "maybe'port" -> (Maybe LnPort -> f (Maybe LnPort)) -> LnPeer -> f LnPeer

HasField LnPeer "maybe'pubKey" (Maybe LnPubKey) 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

fieldOf :: Functor f => Proxy# "maybe'pubKey" -> (Maybe LnPubKey -> f (Maybe LnPubKey)) -> LnPeer -> f LnPeer

HasField LocalBalance "maybe'val" (Maybe Msat) 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

fieldOf :: Functor f => Proxy# "maybe'val" -> (Maybe Msat -> f (Maybe Msat)) -> LocalBalance -> f LocalBalance

HasField RefundMoney "maybe'val" (Maybe Msat) 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

fieldOf :: Functor f => Proxy# "maybe'val" -> (Maybe Msat -> f (Maybe Msat)) -> RefundMoney -> f RefundMoney

HasField RefundOnChainAddress "maybe'val" (Maybe OnChainAddress) 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

HasField RemoteBalance "maybe'val" (Maybe Msat) 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

fieldOf :: Functor f => Proxy# "maybe'val" -> (Maybe Msat -> f (Maybe Msat)) -> RemoteBalance -> f RemoteBalance

HasField Request "maybe'ctx" (Maybe Ctx) 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Methods

fieldOf :: Functor f => Proxy# "maybe'ctx" -> (Maybe Ctx -> f (Maybe Ctx)) -> Request -> f Request

HasField Response "maybe'ctx" (Maybe Ctx) 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Methods

fieldOf :: Functor f => Proxy# "maybe'ctx" -> (Maybe Ctx -> f (Maybe Ctx)) -> Response -> f Response

HasField Response "maybe'either" (Maybe Response'Either) 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Methods

fieldOf :: Functor f => Proxy# "maybe'either" -> (Maybe Response'Either -> f (Maybe Response'Either)) -> Response -> f Response

HasField Response "maybe'failure" (Maybe Response'Failure) 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Methods

fieldOf :: Functor f => Proxy# "maybe'failure" -> (Maybe Response'Failure -> f (Maybe Response'Failure)) -> Response -> f Response

HasField Response "maybe'success" (Maybe Response'Success) 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Methods

fieldOf :: Functor f => Proxy# "maybe'success" -> (Maybe Response'Success -> f (Maybe Response'Success)) -> Response -> f Response

HasField Response'Success "maybe'swapFromLnMaxAmt" (Maybe LocalBalance) 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Methods

fieldOf :: Functor f => Proxy# "maybe'swapFromLnMaxAmt" -> (Maybe LocalBalance -> f (Maybe LocalBalance)) -> Response'Success -> f Response'Success

HasField Response'Success "maybe'swapFromLnMinAmt" (Maybe LocalBalance) 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Methods

fieldOf :: Functor f => Proxy# "maybe'swapFromLnMinAmt" -> (Maybe LocalBalance -> f (Maybe LocalBalance)) -> Response'Success -> f Response'Success

HasField Response'Success "maybe'swapIntoLnMaxAmt" (Maybe LocalBalance) 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Methods

fieldOf :: Functor f => Proxy# "maybe'swapIntoLnMaxAmt" -> (Maybe LocalBalance -> f (Maybe LocalBalance)) -> Response'Success -> f Response'Success

HasField Response'Success "maybe'swapIntoLnMinAmt" (Maybe LocalBalance) 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Methods

fieldOf :: Functor f => Proxy# "maybe'swapIntoLnMinAmt" -> (Maybe LocalBalance -> f (Maybe LocalBalance)) -> Response'Success -> f Response'Success

HasField Response'Success "maybe'swapLnFeeRate" (Maybe FeeRate) 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Methods

fieldOf :: Functor f => Proxy# "maybe'swapLnFeeRate" -> (Maybe FeeRate -> f (Maybe FeeRate)) -> Response'Success -> f Response'Success

HasField Response'Success "maybe'swapLnMinFee" (Maybe FeeMoney) 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Methods

fieldOf :: Functor f => Proxy# "maybe'swapLnMinFee" -> (Maybe FeeMoney -> f (Maybe FeeMoney)) -> Response'Success -> f Response'Success

HasField Request "maybe'ctx" (Maybe Ctx) 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Methods

fieldOf :: Functor f => Proxy# "maybe'ctx" -> (Maybe Ctx -> f (Maybe Ctx)) -> Request -> f Request

HasField Request "maybe'fundMoney" (Maybe FundMoney) 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Methods

fieldOf :: Functor f => Proxy# "maybe'fundMoney" -> (Maybe FundMoney -> f (Maybe FundMoney)) -> Request -> f Request

HasField Request "maybe'fundOnChainAddress" (Maybe FundOnChainAddress) 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Methods

fieldOf :: Functor f => Proxy# "maybe'fundOnChainAddress" -> (Maybe FundOnChainAddress -> f (Maybe FundOnChainAddress)) -> Request -> f Request

HasField Response "maybe'ctx" (Maybe Ctx) 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Methods

fieldOf :: Functor f => Proxy# "maybe'ctx" -> (Maybe Ctx -> f (Maybe Ctx)) -> Response -> f Response

HasField Response "maybe'either" (Maybe Response'Either) 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Methods

fieldOf :: Functor f => Proxy# "maybe'either" -> (Maybe Response'Either -> f (Maybe Response'Either)) -> Response -> f Response

HasField Response "maybe'failure" (Maybe Response'Failure) 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Methods

fieldOf :: Functor f => Proxy# "maybe'failure" -> (Maybe Response'Failure -> f (Maybe Response'Failure)) -> Response -> f Response

HasField Response "maybe'success" (Maybe Response'Success) 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Methods

fieldOf :: Functor f => Proxy# "maybe'success" -> (Maybe Response'Success -> f (Maybe Response'Success)) -> Response -> f Response

HasField Response'Success "maybe'fundLnHodlInvoice" (Maybe FundLnHodlInvoice) 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Methods

fieldOf :: Functor f => Proxy# "maybe'fundLnHodlInvoice" -> (Maybe FundLnHodlInvoice -> f (Maybe FundLnHodlInvoice)) -> Response'Success -> f Response'Success

HasField Request "maybe'ctx" (Maybe Ctx) 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Methods

fieldOf :: Functor f => Proxy# "maybe'ctx" -> (Maybe Ctx -> f (Maybe Ctx)) -> Request -> f Request

HasField Request "maybe'refundOnChainAddress" (Maybe RefundOnChainAddress) 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Methods

fieldOf :: Functor f => Proxy# "maybe'refundOnChainAddress" -> (Maybe RefundOnChainAddress -> f (Maybe RefundOnChainAddress)) -> Request -> f Request

HasField Response "maybe'ctx" (Maybe Ctx) 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Methods

fieldOf :: Functor f => Proxy# "maybe'ctx" -> (Maybe Ctx -> f (Maybe Ctx)) -> Response -> f Response

HasField Response "maybe'either" (Maybe Response'Either) 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Methods

fieldOf :: Functor f => Proxy# "maybe'either" -> (Maybe Response'Either -> f (Maybe Response'Either)) -> Response -> f Response

HasField Response "maybe'failure" (Maybe Response'Failure) 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Methods

fieldOf :: Functor f => Proxy# "maybe'failure" -> (Maybe Response'Failure -> f (Maybe Response'Failure)) -> Response -> f Response

HasField Response "maybe'success" (Maybe Response'Success) 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Methods

fieldOf :: Functor f => Proxy# "maybe'success" -> (Maybe Response'Success -> f (Maybe Response'Success)) -> Response -> f Response

HasField Response'Success "maybe'fundOnChainAddress" (Maybe FundOnChainAddress) 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Methods

fieldOf :: Functor f => Proxy# "maybe'fundOnChainAddress" -> (Maybe FundOnChainAddress -> f (Maybe FundOnChainAddress)) -> Response'Success -> f Response'Success

HasField Response'Success "maybe'minFundMoney" (Maybe FundMoney) 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Methods

fieldOf :: Functor f => Proxy# "maybe'minFundMoney" -> (Maybe FundMoney -> f (Maybe FundMoney)) -> Response'Success -> f Response'Success

HasField LookupInvoiceMsg "maybe'invoiceRef" (Maybe LookupInvoiceMsg'InvoiceRef) 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

fieldOf :: Functor f => Proxy# "maybe'invoiceRef" -> (Maybe LookupInvoiceMsg'InvoiceRef -> f (Maybe LookupInvoiceMsg'InvoiceRef)) -> LookupInvoiceMsg -> f LookupInvoiceMsg

HasField LookupInvoiceMsg "maybe'paymentAddr" (Maybe ByteString) 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

fieldOf :: Functor f => Proxy# "maybe'paymentAddr" -> (Maybe ByteString -> f (Maybe ByteString)) -> LookupInvoiceMsg -> f LookupInvoiceMsg

HasField LookupInvoiceMsg "maybe'paymentHash" (Maybe ByteString) 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

fieldOf :: Functor f => Proxy# "maybe'paymentHash" -> (Maybe ByteString -> f (Maybe ByteString)) -> LookupInvoiceMsg -> f LookupInvoiceMsg

HasField LookupInvoiceMsg "maybe'setId" (Maybe ByteString) 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

fieldOf :: Functor f => Proxy# "maybe'setId" -> (Maybe ByteString -> f (Maybe ByteString)) -> LookupInvoiceMsg -> f LookupInvoiceMsg

HasField ChannelOpenUpdate "maybe'channelPoint" (Maybe ChannelPoint) 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "maybe'channelPoint" -> (Maybe ChannelPoint -> f (Maybe ChannelPoint)) -> ChannelOpenUpdate -> f ChannelOpenUpdate

HasField CloseChannelRequest "maybe'channelPoint" (Maybe ChannelPoint) 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "maybe'channelPoint" -> (Maybe ChannelPoint -> f (Maybe ChannelPoint)) -> CloseChannelRequest -> f CloseChannelRequest

HasField CloseStatusUpdate "maybe'chanClose" (Maybe ChannelCloseUpdate) 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "maybe'chanClose" -> (Maybe ChannelCloseUpdate -> f (Maybe ChannelCloseUpdate)) -> CloseStatusUpdate -> f CloseStatusUpdate

HasField CloseStatusUpdate "maybe'closePending" (Maybe PendingUpdate) 
Instance details

Defined in Proto.Lightning

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.Lightning

Methods

fieldOf :: Functor f => Proxy# "maybe'update" -> (Maybe CloseStatusUpdate'Update -> f (Maybe CloseStatusUpdate'Update)) -> CloseStatusUpdate -> f CloseStatusUpdate

HasField ConnectPeerRequest "maybe'addr" (Maybe LightningAddress) 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "maybe'addr" -> (Maybe LightningAddress -> f (Maybe LightningAddress)) -> ConnectPeerRequest -> f ConnectPeerRequest

HasField GetInfoResponse'FeaturesEntry "maybe'value" (Maybe Feature) 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "maybe'value" -> (Maybe Feature -> f (Maybe Feature)) -> GetInfoResponse'FeaturesEntry -> f GetInfoResponse'FeaturesEntry

HasField OpenChannelRequest "maybe'fundingShim" (Maybe FundingShim) 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "maybe'fundingShim" -> (Maybe FundingShim -> f (Maybe FundingShim)) -> OpenChannelRequest -> f OpenChannelRequest

HasField OpenStatusUpdate "maybe'chanOpen" (Maybe ChannelOpenUpdate) 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "maybe'chanOpen" -> (Maybe ChannelOpenUpdate -> f (Maybe ChannelOpenUpdate)) -> OpenStatusUpdate -> f OpenStatusUpdate

HasField OpenStatusUpdate "maybe'chanPending" (Maybe PendingUpdate) 
Instance details

Defined in Proto.Lightning

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.Lightning

Methods

fieldOf :: Functor f => Proxy# "maybe'psbtFund" -> (Maybe ReadyForPsbtFunding -> f (Maybe ReadyForPsbtFunding)) -> OpenStatusUpdate -> f OpenStatusUpdate

HasField OpenStatusUpdate "maybe'update" (Maybe OpenStatusUpdate'Update) 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "maybe'update" -> (Maybe OpenStatusUpdate'Update -> f (Maybe OpenStatusUpdate'Update)) -> OpenStatusUpdate -> f OpenStatusUpdate

HasField Peer'FeaturesEntry "maybe'value" (Maybe Feature) 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "maybe'value" -> (Maybe Feature -> f (Maybe Feature)) -> Peer'FeaturesEntry -> f Peer'FeaturesEntry

HasField SendRequest "maybe'feeLimit" (Maybe FeeLimit) 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "maybe'feeLimit" -> (Maybe FeeLimit -> f (Maybe FeeLimit)) -> SendRequest -> f SendRequest

HasField SendResponse "maybe'paymentRoute" (Maybe Route) 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "maybe'paymentRoute" -> (Maybe Route -> f (Maybe Route)) -> SendResponse -> f SendResponse

HasField SendToRouteRequest "maybe'route" (Maybe Route) 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "maybe'route" -> (Maybe Route -> f (Maybe Route)) -> SendToRouteRequest -> f SendToRouteRequest

HasField Utxo "maybe'outpoint" (Maybe OutPoint) 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "maybe'outpoint" -> (Maybe OutPoint -> f (Maybe OutPoint)) -> Utxo -> f Utxo

HasField ChanPointShim "maybe'chanPoint" (Maybe ChannelPoint) 
Instance details

Defined in Proto.Lnrpc.Ln0

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.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "maybe'localKey" -> (Maybe KeyDescriptor -> f (Maybe KeyDescriptor)) -> ChanPointShim -> f ChanPointShim

HasField Channel "maybe'localConstraints" (Maybe ChannelConstraints) 
Instance details

Defined in Proto.Lnrpc.Ln0

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.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "maybe'remoteConstraints" -> (Maybe ChannelConstraints -> f (Maybe ChannelConstraints)) -> Channel -> f Channel

HasField ChannelBalanceResponse "maybe'localBalance" (Maybe Amount) 
Instance details

Defined in Proto.Lnrpc.Ln0

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.Lnrpc.Ln0

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.Lnrpc.Ln0

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.Lnrpc.Ln0

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.Lnrpc.Ln0

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.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "maybe'unsettledRemoteBalance" -> (Maybe Amount -> f (Maybe Amount)) -> ChannelBalanceResponse -> f ChannelBalanceResponse

HasField ChannelEdge "maybe'node1Policy" (Maybe RoutingPolicy) 
Instance details

Defined in Proto.Lnrpc.Ln0

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.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "maybe'node2Policy" -> (Maybe RoutingPolicy -> f (Maybe RoutingPolicy)) -> ChannelEdge -> f ChannelEdge

HasField ChannelEdgeUpdate "maybe'chanPoint" (Maybe ChannelPoint) 
Instance details

Defined in Proto.Lnrpc.Ln0

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.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "maybe'routingPolicy" -> (Maybe RoutingPolicy -> f (Maybe RoutingPolicy)) -> ChannelEdgeUpdate -> f ChannelEdgeUpdate

HasField ChannelEventUpdate "maybe'activeChannel" (Maybe ChannelPoint) 
Instance details

Defined in Proto.Lnrpc.Ln0

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.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "maybe'channel" -> (Maybe ChannelEventUpdate'Channel -> f (Maybe ChannelEventUpdate'Channel)) -> ChannelEventUpdate -> f ChannelEventUpdate

HasField ChannelEventUpdate "maybe'closedChannel" (Maybe ChannelCloseSummary) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "maybe'closedChannel" -> (Maybe ChannelCloseSummary -> f (Maybe ChannelCloseSummary)) -> ChannelEventUpdate -> f ChannelEventUpdate

HasField ChannelEventUpdate "maybe'fullyResolvedChannel" (Maybe ChannelPoint) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "maybe'fullyResolvedChannel" -> (Maybe ChannelPoint -> f (Maybe ChannelPoint)) -> ChannelEventUpdate -> f ChannelEventUpdate

HasField ChannelEventUpdate "maybe'inactiveChannel" (Maybe ChannelPoint) 
Instance details

Defined in Proto.Lnrpc.Ln0

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.Lnrpc.Ln0

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.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "maybe'pendingOpenChannel" -> (Maybe PendingUpdate -> f (Maybe PendingUpdate)) -> ChannelEventUpdate -> f ChannelEventUpdate

HasField ChannelPoint "maybe'fundingTxid" (Maybe ChannelPoint'FundingTxid) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "maybe'fundingTxid" -> (Maybe ChannelPoint'FundingTxid -> f (Maybe ChannelPoint'FundingTxid)) -> ChannelPoint -> f ChannelPoint

HasField ChannelPoint "maybe'fundingTxidBytes" (Maybe ByteString) 
Instance details

Defined in Proto.Lnrpc.Ln0

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.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "maybe'fundingTxidStr" -> (Maybe Text -> f (Maybe Text)) -> ChannelPoint -> f ChannelPoint

HasField ClosedChannelUpdate "maybe'chanPoint" (Maybe ChannelPoint) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "maybe'chanPoint" -> (Maybe ChannelPoint -> f (Maybe ChannelPoint)) -> ClosedChannelUpdate -> f ClosedChannelUpdate

HasField FeeLimit "maybe'fixed" (Maybe Int64) 
Instance details

Defined in Proto.Lnrpc.Ln0

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.Lnrpc.Ln0

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.Lnrpc.Ln0

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.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "maybe'percent" -> (Maybe Int64 -> f (Maybe Int64)) -> FeeLimit -> f FeeLimit

HasField FundingShim "maybe'chanPointShim" (Maybe ChanPointShim) 
Instance details

Defined in Proto.Lnrpc.Ln0

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.Lnrpc.Ln0

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.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "maybe'shim" -> (Maybe FundingShim'Shim -> f (Maybe FundingShim'Shim)) -> FundingShim -> f FundingShim

HasField FundingTransitionMsg "maybe'psbtFinalize" (Maybe FundingPsbtFinalize) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "maybe'psbtFinalize" -> (Maybe FundingPsbtFinalize -> f (Maybe FundingPsbtFinalize)) -> FundingTransitionMsg -> f FundingTransitionMsg

HasField FundingTransitionMsg "maybe'psbtVerify" (Maybe FundingPsbtVerify) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "maybe'psbtVerify" -> (Maybe FundingPsbtVerify -> f (Maybe FundingPsbtVerify)) -> FundingTransitionMsg -> f FundingTransitionMsg

HasField FundingTransitionMsg "maybe'shimCancel" (Maybe FundingShimCancel) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "maybe'shimCancel" -> (Maybe FundingShimCancel -> f (Maybe FundingShimCancel)) -> FundingTransitionMsg -> f FundingTransitionMsg

HasField FundingTransitionMsg "maybe'shimRegister" (Maybe FundingShim) 
Instance details

Defined in Proto.Lnrpc.Ln0

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.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "maybe'trigger" -> (Maybe FundingTransitionMsg'Trigger -> f (Maybe FundingTransitionMsg'Trigger)) -> FundingTransitionMsg -> f FundingTransitionMsg

HasField Hop "maybe'ampRecord" (Maybe AMPRecord) 
Instance details

Defined in Proto.Lnrpc.Ln0

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.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "maybe'mppRecord" -> (Maybe MPPRecord -> f (Maybe MPPRecord)) -> Hop -> f Hop

HasField KeyDescriptor "maybe'keyLoc" (Maybe KeyLocator) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "maybe'keyLoc" -> (Maybe KeyLocator -> f (Maybe KeyLocator)) -> KeyDescriptor -> f KeyDescriptor

HasField LightningNode'FeaturesEntry "maybe'value" (Maybe Feature) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "maybe'value" -> (Maybe Feature -> f (Maybe Feature)) -> LightningNode'FeaturesEntry -> f LightningNode'FeaturesEntry

HasField NodeInfo "maybe'node" (Maybe LightningNode) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "maybe'node" -> (Maybe LightningNode -> f (Maybe LightningNode)) -> NodeInfo -> f NodeInfo

HasField NodeMetricsResponse'BetweennessCentralityEntry "maybe'value" (Maybe FloatMetric) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "maybe'value" -> (Maybe FloatMetric -> f (Maybe FloatMetric)) -> NodeMetricsResponse'BetweennessCentralityEntry -> f NodeMetricsResponse'BetweennessCentralityEntry

HasField NodeUpdate'FeaturesEntry "maybe'value" (Maybe Feature) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "maybe'value" -> (Maybe Feature -> f (Maybe Feature)) -> NodeUpdate'FeaturesEntry -> f NodeUpdate'FeaturesEntry

HasField PendingChannelsResponse'ClosedChannel "maybe'channel" (Maybe PendingChannelsResponse'PendingChannel) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "maybe'channel" -> (Maybe PendingChannelsResponse'PendingChannel -> f (Maybe PendingChannelsResponse'PendingChannel)) -> PendingChannelsResponse'ClosedChannel -> f PendingChannelsResponse'ClosedChannel

HasField PendingChannelsResponse'ForceClosedChannel "maybe'channel" (Maybe PendingChannelsResponse'PendingChannel) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "maybe'channel" -> (Maybe PendingChannelsResponse'PendingChannel -> f (Maybe PendingChannelsResponse'PendingChannel)) -> PendingChannelsResponse'ForceClosedChannel -> f PendingChannelsResponse'ForceClosedChannel

HasField PendingChannelsResponse'PendingOpenChannel "maybe'channel" (Maybe PendingChannelsResponse'PendingChannel) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "maybe'channel" -> (Maybe PendingChannelsResponse'PendingChannel -> f (Maybe PendingChannelsResponse'PendingChannel)) -> PendingChannelsResponse'PendingOpenChannel -> f PendingChannelsResponse'PendingOpenChannel

HasField PendingChannelsResponse'WaitingCloseChannel "maybe'channel" (Maybe PendingChannelsResponse'PendingChannel) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "maybe'channel" -> (Maybe PendingChannelsResponse'PendingChannel -> f (Maybe PendingChannelsResponse'PendingChannel)) -> PendingChannelsResponse'WaitingCloseChannel -> f PendingChannelsResponse'WaitingCloseChannel

HasField PendingChannelsResponse'WaitingCloseChannel "maybe'commitments" (Maybe PendingChannelsResponse'Commitments) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "maybe'commitments" -> (Maybe PendingChannelsResponse'Commitments -> f (Maybe PendingChannelsResponse'Commitments)) -> PendingChannelsResponse'WaitingCloseChannel -> f PendingChannelsResponse'WaitingCloseChannel

HasField QueryRoutesRequest "maybe'feeLimit" (Maybe FeeLimit) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "maybe'feeLimit" -> (Maybe FeeLimit -> f (Maybe FeeLimit)) -> QueryRoutesRequest -> f QueryRoutesRequest

HasField Resolution "maybe'outpoint" (Maybe OutPoint) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "maybe'outpoint" -> (Maybe OutPoint -> f (Maybe OutPoint)) -> Resolution -> f Resolution

HasField WalletBalanceResponse'AccountBalanceEntry "maybe'value" (Maybe WalletAccountBalance) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "maybe'value" -> (Maybe WalletAccountBalance -> f (Maybe WalletAccountBalance)) -> WalletBalanceResponse'AccountBalanceEntry -> f WalletBalanceResponse'AccountBalanceEntry

HasField AbandonChannelRequest "maybe'channelPoint" (Maybe ChannelPoint) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "maybe'channelPoint" -> (Maybe ChannelPoint -> f (Maybe ChannelPoint)) -> AbandonChannelRequest -> f AbandonChannelRequest

HasField ChanBackupSnapshot "maybe'multiChanBackup" (Maybe MultiChanBackup) 
Instance details

Defined in Proto.Lnrpc.Ln1

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.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "maybe'singleChanBackups" -> (Maybe ChannelBackups -> f (Maybe ChannelBackups)) -> ChanBackupSnapshot -> f ChanBackupSnapshot

HasField ChannelBackup "maybe'chanPoint" (Maybe ChannelPoint) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "maybe'chanPoint" -> (Maybe ChannelPoint -> f (Maybe ChannelPoint)) -> ChannelBackup -> f ChannelBackup

HasField ExportChannelBackupRequest "maybe'chanPoint" (Maybe ChannelPoint) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "maybe'chanPoint" -> (Maybe ChannelPoint -> f (Maybe ChannelPoint)) -> ExportChannelBackupRequest -> f ExportChannelBackupRequest

HasField FailedUpdate "maybe'outpoint" (Maybe OutPoint) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "maybe'outpoint" -> (Maybe OutPoint -> f (Maybe OutPoint)) -> FailedUpdate -> f FailedUpdate

HasField Failure "maybe'channelUpdate" (Maybe ChannelUpdate) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "maybe'channelUpdate" -> (Maybe ChannelUpdate -> f (Maybe ChannelUpdate)) -> Failure -> f Failure

HasField HTLCAttempt "maybe'failure" (Maybe Failure) 
Instance details

Defined in Proto.Lnrpc.Ln1

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.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "maybe'route" -> (Maybe Route -> f (Maybe Route)) -> HTLCAttempt -> f HTLCAttempt

HasField Invoice'AmpInvoiceStateEntry "maybe'value" (Maybe AMPInvoiceState) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "maybe'value" -> (Maybe AMPInvoiceState -> f (Maybe AMPInvoiceState)) -> Invoice'AmpInvoiceStateEntry -> f Invoice'AmpInvoiceStateEntry

HasField Invoice'FeaturesEntry "maybe'value" (Maybe Feature) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "maybe'value" -> (Maybe Feature -> f (Maybe Feature)) -> Invoice'FeaturesEntry -> f Invoice'FeaturesEntry

HasField InvoiceHTLC "maybe'amp" (Maybe AMP) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "maybe'amp" -> (Maybe AMP -> f (Maybe AMP)) -> InvoiceHTLC -> f InvoiceHTLC

HasField ListPermissionsResponse'MethodPermissionsEntry "maybe'value" (Maybe MacaroonPermissionList) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "maybe'value" -> (Maybe MacaroonPermissionList -> f (Maybe MacaroonPermissionList)) -> ListPermissionsResponse'MethodPermissionsEntry -> f ListPermissionsResponse'MethodPermissionsEntry

HasField PayReq'FeaturesEntry "maybe'value" (Maybe Feature) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "maybe'value" -> (Maybe Feature -> f (Maybe Feature)) -> PayReq'FeaturesEntry -> f PayReq'FeaturesEntry

HasField PolicyUpdateRequest "maybe'chanPoint" (Maybe ChannelPoint) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "maybe'chanPoint" -> (Maybe ChannelPoint -> f (Maybe ChannelPoint)) -> PolicyUpdateRequest -> f PolicyUpdateRequest

HasField PolicyUpdateRequest "maybe'global" (Maybe Bool) 
Instance details

Defined in Proto.Lnrpc.Ln1

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.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "maybe'scope" -> (Maybe PolicyUpdateRequest'Scope -> f (Maybe PolicyUpdateRequest'Scope)) -> PolicyUpdateRequest -> f PolicyUpdateRequest

HasField RPCMiddlewareRequest "maybe'interceptType" (Maybe RPCMiddlewareRequest'InterceptType) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "maybe'interceptType" -> (Maybe RPCMiddlewareRequest'InterceptType -> f (Maybe RPCMiddlewareRequest'InterceptType)) -> RPCMiddlewareRequest -> f RPCMiddlewareRequest

HasField RPCMiddlewareRequest "maybe'request" (Maybe RPCMessage) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "maybe'request" -> (Maybe RPCMessage -> f (Maybe RPCMessage)) -> RPCMiddlewareRequest -> f RPCMiddlewareRequest

HasField RPCMiddlewareRequest "maybe'response" (Maybe RPCMessage) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "maybe'response" -> (Maybe RPCMessage -> f (Maybe RPCMessage)) -> RPCMiddlewareRequest -> f RPCMiddlewareRequest

HasField RPCMiddlewareRequest "maybe'streamAuth" (Maybe StreamAuth) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "maybe'streamAuth" -> (Maybe StreamAuth -> f (Maybe StreamAuth)) -> RPCMiddlewareRequest -> f RPCMiddlewareRequest

HasField RPCMiddlewareResponse "maybe'feedback" (Maybe InterceptFeedback) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "maybe'feedback" -> (Maybe InterceptFeedback -> f (Maybe InterceptFeedback)) -> RPCMiddlewareResponse -> f RPCMiddlewareResponse

HasField RPCMiddlewareResponse "maybe'middlewareMessage" (Maybe RPCMiddlewareResponse'MiddlewareMessage) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "maybe'middlewareMessage" -> (Maybe RPCMiddlewareResponse'MiddlewareMessage -> f (Maybe RPCMiddlewareResponse'MiddlewareMessage)) -> RPCMiddlewareResponse -> f RPCMiddlewareResponse

HasField RPCMiddlewareResponse "maybe'register" (Maybe MiddlewareRegistration) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "maybe'register" -> (Maybe MiddlewareRegistration -> f (Maybe MiddlewareRegistration)) -> RPCMiddlewareResponse -> f RPCMiddlewareResponse

HasField RestoreChanBackupRequest "maybe'backup" (Maybe RestoreChanBackupRequest'Backup) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "maybe'backup" -> (Maybe RestoreChanBackupRequest'Backup -> f (Maybe RestoreChanBackupRequest'Backup)) -> RestoreChanBackupRequest -> f RestoreChanBackupRequest

HasField RestoreChanBackupRequest "maybe'chanBackups" (Maybe ChannelBackups) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "maybe'chanBackups" -> (Maybe ChannelBackups -> f (Maybe ChannelBackups)) -> RestoreChanBackupRequest -> f RestoreChanBackupRequest

HasField RestoreChanBackupRequest "maybe'multiChanBackup" (Maybe ByteString) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "maybe'multiChanBackup" -> (Maybe ByteString -> f (Maybe ByteString)) -> RestoreChanBackupRequest -> f RestoreChanBackupRequest

HasField BuildRouteResponse "maybe'route" (Maybe Route) 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "maybe'route" -> (Maybe Route -> f (Maybe Route)) -> BuildRouteResponse -> f BuildRouteResponse

HasField ForwardEvent "maybe'info" (Maybe HtlcInfo) 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "maybe'info" -> (Maybe HtlcInfo -> f (Maybe HtlcInfo)) -> ForwardEvent -> f ForwardEvent

HasField ForwardHtlcInterceptRequest "maybe'incomingCircuitKey" (Maybe CircuitKey) 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "maybe'incomingCircuitKey" -> (Maybe CircuitKey -> f (Maybe CircuitKey)) -> ForwardHtlcInterceptRequest -> f ForwardHtlcInterceptRequest

HasField ForwardHtlcInterceptResponse "maybe'incomingCircuitKey" (Maybe CircuitKey) 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "maybe'incomingCircuitKey" -> (Maybe CircuitKey -> f (Maybe CircuitKey)) -> ForwardHtlcInterceptResponse -> f ForwardHtlcInterceptResponse

HasField GetMissionControlConfigResponse "maybe'config" (Maybe MissionControlConfig) 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "maybe'config" -> (Maybe MissionControlConfig -> f (Maybe MissionControlConfig)) -> GetMissionControlConfigResponse -> f GetMissionControlConfigResponse

HasField HtlcEvent "maybe'event" (Maybe HtlcEvent'Event) 
Instance details

Defined in Proto.Routerrpc.Router

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.Routerrpc.Router

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.Routerrpc.Router

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.Routerrpc.Router

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.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "maybe'settleEvent" -> (Maybe SettleEvent -> f (Maybe SettleEvent)) -> HtlcEvent -> f HtlcEvent

HasField LinkFailEvent "maybe'info" (Maybe HtlcInfo) 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "maybe'info" -> (Maybe HtlcInfo -> f (Maybe HtlcInfo)) -> LinkFailEvent -> f LinkFailEvent

HasField PairHistory "maybe'history" (Maybe PairData) 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "maybe'history" -> (Maybe PairData -> f (Maybe PairData)) -> PairHistory -> f PairHistory

HasField QueryProbabilityResponse "maybe'history" (Maybe PairData) 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "maybe'history" -> (Maybe PairData -> f (Maybe PairData)) -> QueryProbabilityResponse -> f QueryProbabilityResponse

HasField SendToRouteRequest "maybe'route" (Maybe Route) 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "maybe'route" -> (Maybe Route -> f (Maybe Route)) -> SendToRouteRequest -> f SendToRouteRequest

HasField SendToRouteResponse "maybe'failure" (Maybe Failure) 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "maybe'failure" -> (Maybe Failure -> f (Maybe Failure)) -> SendToRouteResponse -> f SendToRouteResponse

HasField SetMissionControlConfigRequest "maybe'config" (Maybe MissionControlConfig) 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "maybe'config" -> (Maybe MissionControlConfig -> f (Maybe MissionControlConfig)) -> SetMissionControlConfigRequest -> f SetMissionControlConfigRequest

HasField UpdateChanStatusRequest "maybe'chanPoint" (Maybe ChannelPoint) 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "maybe'chanPoint" -> (Maybe ChannelPoint -> f (Maybe ChannelPoint)) -> UpdateChanStatusRequest -> f UpdateChanStatusRequest

HasField KeyDescriptor "maybe'keyLoc" (Maybe KeyLocator) 
Instance details

Defined in Proto.Signrpc.Signer

Methods

fieldOf :: Functor f => Proxy# "maybe'keyLoc" -> (Maybe KeyLocator -> f (Maybe KeyLocator)) -> KeyDescriptor -> f KeyDescriptor

HasField SharedKeyRequest "maybe'keyDesc" (Maybe KeyDescriptor) 
Instance details

Defined in Proto.Signrpc.Signer

Methods

fieldOf :: Functor f => Proxy# "maybe'keyDesc" -> (Maybe KeyDescriptor -> f (Maybe KeyDescriptor)) -> SharedKeyRequest -> f SharedKeyRequest

HasField SharedKeyRequest "maybe'keyLoc" (Maybe KeyLocator) 
Instance details

Defined in Proto.Signrpc.Signer

Methods

fieldOf :: Functor f => Proxy# "maybe'keyLoc" -> (Maybe KeyLocator -> f (Maybe KeyLocator)) -> SharedKeyRequest -> f SharedKeyRequest

HasField SignDescriptor "maybe'keyDesc" (Maybe KeyDescriptor) 
Instance details

Defined in Proto.Signrpc.Signer

Methods

fieldOf :: Functor f => Proxy# "maybe'keyDesc" -> (Maybe KeyDescriptor -> f (Maybe KeyDescriptor)) -> SignDescriptor -> f SignDescriptor

HasField SignDescriptor "maybe'output" (Maybe TxOut) 
Instance details

Defined in Proto.Signrpc.Signer

Methods

fieldOf :: Functor f => Proxy# "maybe'output" -> (Maybe TxOut -> f (Maybe TxOut)) -> SignDescriptor -> f SignDescriptor

HasField SignMessageReq "maybe'keyLoc" (Maybe KeyLocator) 
Instance details

Defined in Proto.Signrpc.Signer

Methods

fieldOf :: Functor f => Proxy# "maybe'keyLoc" -> (Maybe KeyLocator -> f (Maybe KeyLocator)) -> SignMessageReq -> f SignMessageReq

HasField BumpFeeRequest "maybe'outpoint" (Maybe OutPoint) 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "maybe'outpoint" -> (Maybe OutPoint -> f (Maybe OutPoint)) -> BumpFeeRequest -> f BumpFeeRequest

HasField FundPsbtRequest "maybe'fees" (Maybe FundPsbtRequest'Fees) 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "maybe'fees" -> (Maybe FundPsbtRequest'Fees -> f (Maybe FundPsbtRequest'Fees)) -> FundPsbtRequest -> f FundPsbtRequest

HasField FundPsbtRequest "maybe'psbt" (Maybe ByteString) 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "maybe'psbt" -> (Maybe ByteString -> f (Maybe ByteString)) -> FundPsbtRequest -> f FundPsbtRequest

HasField FundPsbtRequest "maybe'raw" (Maybe TxTemplate) 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "maybe'raw" -> (Maybe TxTemplate -> f (Maybe TxTemplate)) -> FundPsbtRequest -> f FundPsbtRequest

HasField FundPsbtRequest "maybe'satPerVbyte" (Maybe Word64) 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "maybe'satPerVbyte" -> (Maybe Word64 -> f (Maybe Word64)) -> FundPsbtRequest -> f FundPsbtRequest

HasField FundPsbtRequest "maybe'targetConf" (Maybe Word32) 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "maybe'targetConf" -> (Maybe Word32 -> f (Maybe Word32)) -> FundPsbtRequest -> f FundPsbtRequest

HasField FundPsbtRequest "maybe'template" (Maybe FundPsbtRequest'Template) 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "maybe'template" -> (Maybe FundPsbtRequest'Template -> f (Maybe FundPsbtRequest'Template)) -> FundPsbtRequest -> f FundPsbtRequest

HasField ImportAccountResponse "maybe'account" (Maybe Account) 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "maybe'account" -> (Maybe Account -> f (Maybe Account)) -> ImportAccountResponse -> f ImportAccountResponse

HasField LeaseOutputRequest "maybe'outpoint" (Maybe OutPoint) 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "maybe'outpoint" -> (Maybe OutPoint -> f (Maybe OutPoint)) -> LeaseOutputRequest -> f LeaseOutputRequest

HasField ListSweepsResponse "maybe'sweeps" (Maybe ListSweepsResponse'Sweeps) 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "maybe'sweeps" -> (Maybe ListSweepsResponse'Sweeps -> f (Maybe ListSweepsResponse'Sweeps)) -> ListSweepsResponse -> f ListSweepsResponse

HasField ListSweepsResponse "maybe'transactionDetails" (Maybe TransactionDetails) 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "maybe'transactionDetails" -> (Maybe TransactionDetails -> f (Maybe TransactionDetails)) -> ListSweepsResponse -> f ListSweepsResponse

HasField ListSweepsResponse "maybe'transactionIds" (Maybe ListSweepsResponse'TransactionIDs) 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "maybe'transactionIds" -> (Maybe ListSweepsResponse'TransactionIDs -> f (Maybe ListSweepsResponse'TransactionIDs)) -> ListSweepsResponse -> f ListSweepsResponse

HasField PendingSweep "maybe'outpoint" (Maybe OutPoint) 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "maybe'outpoint" -> (Maybe OutPoint -> f (Maybe OutPoint)) -> PendingSweep -> f PendingSweep

HasField ReleaseOutputRequest "maybe'outpoint" (Maybe OutPoint) 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "maybe'outpoint" -> (Maybe OutPoint -> f (Maybe OutPoint)) -> ReleaseOutputRequest -> f ReleaseOutputRequest

HasField UtxoLease "maybe'outpoint" (Maybe OutPoint) 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "maybe'outpoint" -> (Maybe OutPoint -> f (Maybe OutPoint)) -> UtxoLease -> f UtxoLease

HasField InitWalletRequest "maybe'channelBackups" (Maybe ChanBackupSnapshot) 
Instance details

Defined in Proto.Walletunlocker

Methods

fieldOf :: Functor f => Proxy# "maybe'channelBackups" -> (Maybe ChanBackupSnapshot -> f (Maybe ChanBackupSnapshot)) -> InitWalletRequest -> f InitWalletRequest

HasField InitWalletRequest "maybe'watchOnly" (Maybe WatchOnly) 
Instance details

Defined in Proto.Walletunlocker

Methods

fieldOf :: Functor f => Proxy# "maybe'watchOnly" -> (Maybe WatchOnly -> f (Maybe WatchOnly)) -> InitWalletRequest -> f InitWalletRequest

HasField UnlockWalletRequest "maybe'channelBackups" (Maybe ChanBackupSnapshot) 
Instance details

Defined in Proto.Walletunlocker

Methods

fieldOf :: Functor f => Proxy# "maybe'channelBackups" -> (Maybe ChanBackupSnapshot -> f (Maybe ChanBackupSnapshot)) -> UnlockWalletRequest -> f UnlockWalletRequest

(PersistEntity rec, PersistField typ, SymbolToField sym rec typ) => HasField (sym :: Symbol) (SqlExpr (Maybe (Entity rec))) (SqlExpr (Value (Maybe typ)))

This instance allows you to use record.field notation with GC 9.2's OverloadedRecordDot extension.

Example:

-- persistent model:
Person
    name         Text

BlogPost
    title        Text
    authorId     PersonId

-- query:

select $ do
    (p :& bp) <- from $
        table Person
        leftJoin table BlogPost
        on do
            \(p :& bp) ->
                just p.id ==. bp.authorId
    pure (p.name, bp.title)

The following forms are all equivalent:

blogPost :: SqlExpr (Maybe (Entity BlogPost))

blogPost ?. BlogPostTitle
blogPost ?. #title
blogPost.title

Since: esqueleto-3.5.4.0

Instance details

Defined in Database.Esqueleto.Internal.Internal

Methods

getField :: SqlExpr (Maybe (Entity rec)) -> SqlExpr (Value (Maybe typ)) #

Lift a => Lift (Maybe a :: Type) 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Maybe a -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Maybe a -> Code m (Maybe a) #

(Selector s, FromJSON a) => RecordFromJSON' arity (S1 s (K1 i (Maybe a) :: Type -> Type)) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

recordParseJSON' :: (ConName :* (TypeName :* (Options :* FromArgs arity a0))) -> Object -> Parser (S1 s (K1 i (Maybe a)) a0)

Out a => Out (Maybe a) 
Instance details

Defined in Text.PrettyPrint.GenericPretty

Methods

docPrec :: Int -> Maybe a -> Doc #

doc :: Maybe a -> Doc #

docList :: [Maybe a] -> Doc #

FromJSON a => FromJSON (Maybe a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON a => ToJSON (Maybe a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Semigroup a => Monoid (Maybe a)

Lift a semigroup into Maybe forming a Monoid according to http://en.wikipedia.org/wiki/Monoid: "Any semigroup S may be turned into a monoid simply by adjoining an element e not in S and defining e*e = e and e*s = s = s*e for all s ∈ S."

Since 4.11.0: constraint on inner a value generalised from Monoid to Semigroup.

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

mempty :: Maybe a #

mappend :: Maybe a -> Maybe a -> Maybe a #

mconcat :: [Maybe a] -> Maybe a #

Semigroup a => Semigroup (Maybe a)

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

(<>) :: Maybe a -> Maybe a -> Maybe a #

sconcat :: NonEmpty (Maybe a) -> Maybe a #

stimes :: Integral b => b -> Maybe a -> Maybe a #

Generic (Maybe a) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Maybe a) :: Type -> Type #

Methods

from :: Maybe a -> Rep (Maybe a) x #

to :: Rep (Maybe a) x -> Maybe a #

SingKind a => SingKind (Maybe a)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Associated Types

type DemoteRep (Maybe a)

Methods

fromSing :: forall (a0 :: Maybe a). Sing a0 -> DemoteRep (Maybe a)

Read a => Read (Maybe a)

Since: base-2.1

Instance details

Defined in GHC.Read

Show a => Show (Maybe a)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Maybe a -> ShowS #

show :: Maybe a -> String #

showList :: [Maybe a] -> ShowS #

Default (Maybe a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Maybe a #

NFData a => NFData (Maybe a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Maybe a -> () #

ToMaybe (SqlExpr (Maybe a)) 
Instance details

Defined in Database.Esqueleto.Experimental.ToMaybe

Associated Types

type ToMaybeT (SqlExpr (Maybe a)) #

Methods

toMaybe :: SqlExpr (Maybe a) -> ToMaybeT (SqlExpr (Maybe a)) #

FromPreprocess (SqlExpr (Maybe (Entity val))) => From (SqlExpr (Maybe (Entity val))) 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Methods

from_ :: SqlQuery (SqlExpr (Maybe (Entity val))) #

(PersistEntity val, BackendCompatible SqlBackend (PersistEntityBackend val)) => FromPreprocess (SqlExpr (Maybe (Entity val))) 
Instance details

Defined in Database.Esqueleto.Internal.Internal

SqlString a => SqlString (Maybe a)

Since: esqueleto-2.4.0

Instance details

Defined in Database.Esqueleto.Internal.Internal

Eq a => Eq (Maybe a)

Since: base-2.1

Instance details

Defined in GHC.Maybe

Methods

(==) :: Maybe a -> Maybe a -> Bool #

(/=) :: Maybe a -> Maybe a -> Bool #

Ord a => Ord (Maybe a)

Since: base-2.1

Instance details

Defined in GHC.Maybe

Methods

compare :: Maybe a -> Maybe a -> Ordering #

(<) :: Maybe a -> Maybe a -> Bool #

(<=) :: Maybe a -> Maybe a -> Bool #

(>) :: Maybe a -> Maybe a -> Bool #

(>=) :: Maybe a -> Maybe a -> Bool #

max :: Maybe a -> Maybe a -> Maybe a #

min :: Maybe a -> Maybe a -> Maybe a #

Hashable a => Hashable (Maybe a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Maybe a -> Int #

hash :: Maybe a -> Int #

FromHttpApiData a => FromHttpApiData (Maybe a)
>>> parseUrlPiece "Just 123" :: Either Text (Maybe Int)
Right (Just 123)
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData a => ToHttpApiData (Maybe a)
>>> toUrlPiece (Just "Hello")
"just Hello"
Instance details

Defined in Web.Internal.HttpApiData

(QueryKeyLike k, QueryValueLike v) => QueryLike [Maybe (k, v)] 
Instance details

Defined in Network.HTTP.Types.QueryLike

Methods

toQuery :: [Maybe (k, v)] -> Query #

QueryValueLike a => QueryValueLike (Maybe a) 
Instance details

Defined in Network.HTTP.Types.QueryLike

MonoFoldable (Maybe a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (Maybe a) -> m) -> Maybe a -> m #

ofoldr :: (Element (Maybe a) -> b -> b) -> b -> Maybe a -> b #

ofoldl' :: (a0 -> Element (Maybe a) -> a0) -> a0 -> Maybe a -> a0 #

otoList :: Maybe a -> [Element (Maybe a)] #

oall :: (Element (Maybe a) -> Bool) -> Maybe a -> Bool #

oany :: (Element (Maybe a) -> Bool) -> Maybe a -> Bool #

onull :: Maybe a -> Bool #

olength :: Maybe a -> Int #

olength64 :: Maybe a -> Int64 #

ocompareLength :: Integral i => Maybe a -> i -> Ordering #

otraverse_ :: Applicative f => (Element (Maybe a) -> f b) -> Maybe a -> f () #

ofor_ :: Applicative f => Maybe a -> (Element (Maybe a) -> f b) -> f () #

omapM_ :: Applicative m => (Element (Maybe a) -> m ()) -> Maybe a -> m () #

oforM_ :: Applicative m => Maybe a -> (Element (Maybe a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (Maybe a) -> m a0) -> a0 -> Maybe a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (Maybe a) -> m) -> Maybe a -> m #

ofoldr1Ex :: (Element (Maybe a) -> Element (Maybe a) -> Element (Maybe a)) -> Maybe a -> Element (Maybe a) #

ofoldl1Ex' :: (Element (Maybe a) -> Element (Maybe a) -> Element (Maybe a)) -> Maybe a -> Element (Maybe a) #

headEx :: Maybe a -> Element (Maybe a) #

lastEx :: Maybe a -> Element (Maybe a) #

unsafeHead :: Maybe a -> Element (Maybe a) #

unsafeLast :: Maybe a -> Element (Maybe a) #

maximumByEx :: (Element (Maybe a) -> Element (Maybe a) -> Ordering) -> Maybe a -> Element (Maybe a) #

minimumByEx :: (Element (Maybe a) -> Element (Maybe a) -> Ordering) -> Maybe a -> Element (Maybe a) #

oelem :: Element (Maybe a) -> Maybe a -> Bool #

onotElem :: Element (Maybe a) -> Maybe a -> Bool #

MonoFunctor (Maybe a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Maybe a) -> Element (Maybe a)) -> Maybe a -> Maybe a #

MonoPointed (Maybe a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Maybe a) -> Maybe a #

MonoTraversable (Maybe a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (Maybe a) -> f (Element (Maybe a))) -> Maybe a -> f (Maybe a) #

omapM :: Applicative m => (Element (Maybe a) -> m (Element (Maybe a))) -> Maybe a -> m (Maybe a) #

PathPiece a => PathPiece (Maybe a) 
Instance details

Defined in Web.PathPieces

PersistField a => PersistField (Maybe a) 
Instance details

Defined in Database.Persist.Class.PersistField

PersistFieldSql a => PersistFieldSql (Maybe a) 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy (Maybe a) -> SqlType #

RawSql a => RawSql (Maybe a)

Since: persistent-1.0.1

Instance details

Defined in Database.Persist.Sql.Class

Pretty a => Pretty (Maybe a)

Ignore Nothings, print Just contents.

>>> pretty (Just True)
True
>>> braces (pretty (Nothing :: Maybe Bool))
{}
>>> pretty [Just 1, Nothing, Just 3, Nothing]
[1, 3]
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Maybe a -> Doc ann #

prettyList :: [Maybe a] -> Doc ann #

(TypeError (DisallowInstance "Maybe") :: Constraint) => Container (Maybe a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Maybe a) #

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 #

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 #

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)) #

safeMaximum :: Maybe a -> Maybe (Element (Maybe a)) #

safeMinimum :: Maybe a -> Maybe (Element (Maybe a)) #

safeFoldr1 :: (Element (Maybe a) -> Element (Maybe a) -> Element (Maybe a)) -> Maybe a -> Maybe (Element (Maybe a)) #

safeFoldl1 :: (Element (Maybe a) -> Element (Maybe a) -> Element (Maybe a)) -> Maybe a -> Maybe (Element (Maybe a)) #

ToContent (Maybe SwapHash) Source # 
Instance details

Defined in BtcLsp.Data.Type

ToTypedContent (Maybe SwapHash) Source # 
Instance details

Defined in BtcLsp.Data.Type

Generic1 Maybe 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 Maybe :: k -> Type #

Methods

from1 :: forall (a :: k). Maybe a -> Rep1 Maybe a #

to1 :: forall (a :: k). Rep1 Maybe a -> Maybe a #

SingI ('Nothing :: Maybe a)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

sing :: Sing 'Nothing

PersistEntity a => SqlSelect (SqlExpr (Maybe (Entity a))) (Maybe (Entity a))

You may return a possibly-NULL Entity from a select query.

Instance details

Defined in Database.Esqueleto.Internal.Internal

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 Key Maybe 
Instance details

Defined in Data.Key

type Key Maybe = ()
type StM Maybe a 
Instance details

Defined in Control.Monad.Trans.Control

type StM Maybe a = a
type DemoteRep (Maybe a) 
Instance details

Defined in GHC.Generics

type DemoteRep (Maybe a) = Maybe (DemoteRep a)
type Rep (Maybe a)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

type Rep (Maybe a) = D1 ('MetaData "Maybe" "GHC.Maybe" "base" 'False) (C1 ('MetaCons "Nothing" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Just" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))
data Sing (b :: Maybe a) 
Instance details

Defined in GHC.Generics

data Sing (b :: Maybe a) where
type ToMaybeT (SqlExpr (Maybe a)) 
Instance details

Defined in Database.Esqueleto.Experimental.ToMaybe

type Element (Maybe a) 
Instance details

Defined in Data.MonoTraversable

type Element (Maybe a) = 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

type Rep1 Maybe = D1 ('MetaData "Maybe" "GHC.Maybe" "base" 'False) (C1 ('MetaCons "Nothing" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Just" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1))

data Ordering #

Constructors

LT 
EQ 
GT 

Instances

Instances details
FromJSON Ordering 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Ordering 
Instance details

Defined in Data.Aeson.Types.ToJSON

Monoid Ordering

Since: base-2.1

Instance details

Defined in GHC.Base

Semigroup Ordering

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Bounded Ordering

Since: base-2.1

Instance details

Defined in GHC.Enum

Enum Ordering

Since: base-2.1

Instance details

Defined in GHC.Enum

Generic Ordering 
Instance details

Defined in GHC.Generics

Associated Types

type Rep Ordering :: Type -> Type #

Methods

from :: Ordering -> Rep Ordering x #

to :: Rep Ordering x -> Ordering #

Read Ordering

Since: base-2.1

Instance details

Defined in GHC.Read

Show Ordering

Since: base-2.1

Instance details

Defined in GHC.Show

Default Ordering 
Instance details

Defined in Data.Default.Class

Methods

def :: Ordering #

NFData Ordering 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Ordering -> () #

Eq Ordering 
Instance details

Defined in GHC.Classes

Ord Ordering 
Instance details

Defined in GHC.Classes

Hashable Ordering 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Ordering -> Int #

hash :: Ordering -> Int #

FromHttpApiData Ordering 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Ordering 
Instance details

Defined in Web.Internal.HttpApiData

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

Instances details
Out Rational 
Instance details

Defined in Text.PrettyPrint.GenericPretty

Methods

docPrec :: Int -> Rational -> Doc #

doc :: Rational -> Doc #

docList :: [Rational] -> Doc #

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

PersistFieldSql Rational 
Instance details

Defined in Database.Persist.Sql.Class

From FeeRate Rational Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: FeeRate -> Rational

TryFrom Rational FeeRate Source # 
Instance details

Defined in BtcLsp.Data.Type

Integral a => Lift (Ratio a :: Type) 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Ratio a -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Ratio a -> Code m (Ratio a) #

From FeeRate (Ratio Word64) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: FeeRate -> Ratio Word64

From FeeRate (Ratio Natural) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: FeeRate -> Ratio Natural

From Vbyte (Ratio Natural) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Vbyte -> Ratio Natural

From SatPerVbyte (Ratio Natural) Source # 
Instance details

Defined in BtcLsp.Math.OnChain

TryFrom Rational (Money owner btcl mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

tryFrom :: Rational -> Either (TryFromException Rational (Money owner btcl mrel)) (Money owner btcl mrel)

Out (Ratio Natural) Source # 
Instance details

Defined in BtcLsp.Data.Orphan

(FromJSON a, Integral a) => FromJSON (Ratio a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

(ToJSON a, Integral a) => ToJSON (Ratio a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

(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 () #

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] #

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, Read a) => Read (Ratio a)

Since: base-2.1

Instance details

Defined in GHC.Read

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 => 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 => Default (Ratio a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Ratio a #

NFData a => NFData (Ratio a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: 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 => 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 #

Hashable a => Hashable (Ratio a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Ratio a -> Int #

hash :: Ratio a -> Int #

From (Ratio Word64) FeeRate Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Ratio Word64 -> FeeRate

From (Ratio Natural) Vbyte Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Ratio Natural -> Vbyte

From (Ratio Natural) SatPerVbyte Source # 
Instance details

Defined in BtcLsp.Math.OnChain

TryFrom (Ratio Natural) (Money owner btcl mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

tryFrom :: Ratio Natural -> Either (TryFromException (Ratio Natural) (Money owner btcl mrel)) (Money owner btcl mrel)

From (Money owner btcl mrel) Rational Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Money owner btcl mrel -> Rational

From (Money owner btcl mrel) (Ratio Natural) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Money owner btcl mrel -> Ratio Natural

type Rational = Ratio Integer #

Arbitrary-precision rational numbers, represented as a ratio of two Integer values. A rational number may be constructed using the % operator.

data IO a #

A value of type IO a is a computation which, when performed, does some I/O before returning a value of type a.

There is really only one way to "perform" an I/O action: bind it to Main.main in your program. When your program is run, the I/O will be performed. It isn't possible to perform I/O from an arbitrary function, unless that function is itself in the IO monad and called at some point, directly or indirectly, from Main.main.

IO is a monad, so IO actions can be combined using either the do-notation or the >> and >>= operations from the Monad class.

Instances

Instances details
MonadFail IO

Since: base-4.9.0.0

Instance details

Defined in Control.Monad.Fail

Methods

fail :: String -> IO a #

MonadIO IO

Since: base-4.9.0.0

Instance details

Defined in Control.Monad.IO.Class

Methods

liftIO :: IO a -> IO a #

Alternative IO

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

empty :: IO a #

(<|>) :: IO a -> IO a -> IO a #

some :: IO a -> IO [a] #

many :: IO a -> IO [a] #

Applicative IO

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

pure :: a -> IO a #

(<*>) :: IO (a -> b) -> IO a -> IO b #

liftA2 :: (a -> b -> c) -> IO a -> IO b -> IO c #

(*>) :: IO a -> IO b -> IO b #

(<*) :: IO a -> IO b -> IO a #

Functor IO

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

fmap :: (a -> b) -> IO a -> IO b #

(<$) :: a -> IO b -> IO a #

Monad IO

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

(>>=) :: IO a -> (a -> IO b) -> IO b #

(>>) :: IO a -> IO b -> IO b #

return :: a -> IO a #

MonadPlus IO

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

mzero :: IO a #

mplus :: IO a -> IO a -> IO a #

PrimMonad IO 
Instance details

Defined in Basement.Monad

Associated Types

type PrimState IO #

type PrimVar IO :: Type -> Type #

Methods

primitive :: (State# (PrimState IO) -> (# State# (PrimState IO), a #)) -> IO a #

primThrow :: Exception e => e -> IO a #

unPrimMonad :: IO a -> State# (PrimState IO) -> (# State# (PrimState IO), a #) #

primVarNew :: a -> IO (PrimVar IO a) #

primVarRead :: PrimVar IO a -> IO a #

primVarWrite :: PrimVar IO a -> a -> IO () #

MonadRandom IO 
Instance details

Defined in Crypto.Random.Types

Methods

getRandomBytes :: ByteArray byteArray => Int -> IO byteArray #

MonadCatch IO 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => IO a -> (e -> IO a) -> IO a #

MonadMask IO 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. IO a -> IO a) -> IO b) -> IO b #

uninterruptibleMask :: ((forall a. IO a -> IO a) -> IO b) -> IO b #

generalBracket :: IO a -> (a -> ExitCase b -> IO c) -> (a -> IO b) -> IO (b, c) #

MonadThrow IO 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> IO a #

PrimBase IO 
Instance details

Defined in Control.Monad.Primitive

Methods

internal :: IO a -> State# (PrimState IO) -> (# State# (PrimState IO), a #) #

PrimMonad IO 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState IO #

Methods

primitive :: (State# (PrimState IO) -> (# State# (PrimState IO), a #)) -> IO a #

Apply IO 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(<.>) :: IO (a -> b) -> IO a -> IO b #

(.>) :: IO a -> IO b -> IO b #

(<.) :: IO a -> IO b -> IO a #

liftF2 :: (a -> b -> c) -> IO a -> IO b -> IO c #

Bind IO 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(>>-) :: IO a -> (a -> IO b) -> IO b #

join :: IO (IO a) -> IO a #

Quasi IO 
Instance details

Defined in Language.Haskell.TH.Syntax

Quote IO 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

newName :: String -> IO Name #

MonadUnliftIO IO 
Instance details

Defined in Control.Monad.IO.Unlift

Methods

withRunInIO :: ((forall a. IO a -> IO a) -> IO b) -> IO b #

MonadBaseControl IO IO 
Instance details

Defined in Control.Monad.Trans.Control

Associated Types

type StM IO a #

Methods

liftBaseWith :: (RunInBase IO IO -> IO a) -> IO a #

restoreM :: StM IO a -> IO a #

MonadError IOException IO 
Instance details

Defined in Control.Monad.Error.Class

Methods

throwError :: IOException -> IO a #

catchError :: IO a -> (IOException -> IO a) -> IO a #

Monoid a => Monoid (IO a)

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

mempty :: IO a #

mappend :: IO a -> IO a -> IO a #

mconcat :: [IO a] -> IO a #

Semigroup a => Semigroup (IO a)

Since: base-4.10.0.0

Instance details

Defined in GHC.Base

Methods

(<>) :: IO a -> IO a -> IO a #

sconcat :: NonEmpty (IO a) -> IO a #

stimes :: Integral b => b -> IO a -> IO a #

Default a => Default (IO a) 
Instance details

Defined in Data.Default.Class

Methods

def :: IO a #

MonoFunctor (IO a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (IO a) -> Element (IO a)) -> IO a -> IO a #

MonoPointed (IO a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (IO a) -> IO a #

ToFlushBuilder builder => ToContent (ConduitT () builder (ResourceT IO) ()) 
Instance details

Defined in Yesod.Core.Content

Methods

toContent :: ConduitT () builder (ResourceT IO) () -> Content #

ToFlushBuilder builder => ToContent (SealedConduitT () builder (ResourceT IO) ()) 
Instance details

Defined in Yesod.Core.Content

Methods

toContent :: SealedConduitT () builder (ResourceT IO) () -> Content #

ToFlushBuilder builder => ToContent (Pipe () () builder () (ResourceT IO) ()) 
Instance details

Defined in Yesod.Core.Content

Methods

toContent :: Pipe () () builder () (ResourceT IO) () -> Content #

type PrimState IO 
Instance details

Defined in Basement.Monad

type PrimVar IO 
Instance details

Defined in Basement.Monad

type PrimState IO 
Instance details

Defined in Control.Monad.Primitive

type StM IO a 
Instance details

Defined in Control.Monad.Trans.Control

type StM IO a = a
type Element (IO a) 
Instance details

Defined in Data.MonoTraversable

type Element (IO a) = a

data Word #

A Word is an unsigned integral type, with the same size as Int.

Instances

Instances details
FromJSON Word 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Word 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Word 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Word 
Instance details

Defined in Data.Aeson.Types.ToJSON

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

Storable Word

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Word -> Int #

alignment :: Word -> Int #

peekElemOff :: Ptr Word -> Int -> IO Word #

pokeElemOff :: Ptr Word -> Int -> Word -> IO () #

peekByteOff :: Ptr b -> Int -> IO Word #

pokeByteOff :: Ptr b -> Int -> Word -> IO () #

peek :: Ptr Word -> IO Word #

poke :: Ptr Word -> Word -> IO () #

Bounded Word

Since: base-2.1

Instance details

Defined in GHC.Enum

Enum Word

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

succ :: Word -> Word #

pred :: Word -> Word #

toEnum :: Int -> Word #

fromEnum :: Word -> Int #

enumFrom :: Word -> [Word] #

enumFromThen :: Word -> Word -> [Word] #

enumFromTo :: Word -> Word -> [Word] #

enumFromThenTo :: Word -> Word -> Word -> [Word] #

Num Word

Since: base-2.1

Instance details

Defined in GHC.Num

Methods

(+) :: Word -> Word -> Word #

(-) :: Word -> Word -> Word #

(*) :: Word -> Word -> Word #

negate :: Word -> Word #

abs :: Word -> Word #

signum :: Word -> Word #

fromInteger :: Integer -> Word #

Read Word

Since: base-4.5.0.0

Instance details

Defined in GHC.Read

Integral Word

Since: base-2.1

Instance details

Defined in GHC.Real

Methods

quot :: Word -> Word -> Word #

rem :: Word -> Word -> Word #

div :: Word -> Word -> Word #

mod :: Word -> Word -> Word #

quotRem :: Word -> Word -> (Word, Word) #

divMod :: Word -> Word -> (Word, Word) #

toInteger :: Word -> Integer #

Real Word

Since: base-2.1

Instance details

Defined in GHC.Real

Methods

toRational :: Word -> Rational #

Show Word

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Word -> ShowS #

show :: Word -> String #

showList :: [Word] -> ShowS #

BitOps Word 
Instance details

Defined in Basement.Bits

FiniteBitsOps Word 
Instance details

Defined in Basement.Bits

Subtractive Word 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Word #

Methods

(-) :: Word -> Word -> Difference Word #

PrimMemoryComparable Word 
Instance details

Defined in Basement.PrimType

PrimType Word 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Word :: Nat #

ToMarkup Word 
Instance details

Defined in Text.Blaze

ToValue Word 
Instance details

Defined in Text.Blaze

Default Word 
Instance details

Defined in Data.Default.Class

Methods

def :: Word #

NFData Word 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word -> () #

ToLogStr Word

Since: fast-logger-2.4.14

Instance details

Defined in System.Log.FastLogger.LogStr

Methods

toLogStr :: Word -> LogStr #

Eq Word 
Instance details

Defined in GHC.Classes

Methods

(==) :: Word -> Word -> Bool #

(/=) :: Word -> Word -> Bool #

Ord Word 
Instance details

Defined in GHC.Classes

Methods

compare :: Word -> Word -> Ordering #

(<) :: Word -> Word -> Bool #

(<=) :: Word -> Word -> Bool #

(>) :: Word -> Word -> Bool #

(>=) :: Word -> Word -> Bool #

max :: Word -> Word -> Word #

min :: Word -> Word -> Word #

Hashable Word 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word -> Int #

hash :: Word -> Int #

FromHttpApiData Word 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Word 
Instance details

Defined in Web.Internal.HttpApiData

PathPiece Word 
Instance details

Defined in Web.PathPieces

PersistField Word 
Instance details

Defined in Database.Persist.Class.PersistField

PersistFieldSql Word 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Word -> SqlType #

Pretty Word 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Word -> Doc ann #

prettyList :: [Word] -> Doc ann #

Prim Word 
Instance details

Defined in Data.Primitive.Types

Uniform Word 
Instance details

Defined in System.Random.Internal

Methods

uniformM :: StatefulGen g m => g -> m Word #

UniformRange Word 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Word, Word) -> g -> m Word #

Unbox Word 
Instance details

Defined in Data.Vector.Unboxed.Base

Lift Word 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Word -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Word -> Code m Word #

Vector Vector Word 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Word 
Instance details

Defined in Data.Vector.Unboxed.Base

Generic1 (URec Word :: k -> Type) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 (URec Word) :: k -> Type #

Methods

from1 :: forall (a :: k0). URec Word a -> Rep1 (URec Word) a #

to1 :: forall (a :: k0). Rep1 (URec Word) a -> URec Word a #

Foldable (UWord :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => UWord m -> m #

foldMap :: Monoid m => (a -> m) -> UWord a -> m #

foldMap' :: Monoid m => (a -> m) -> UWord a -> m #

foldr :: (a -> b -> b) -> b -> UWord a -> b #

foldr' :: (a -> b -> b) -> b -> UWord a -> b #

foldl :: (b -> a -> b) -> b -> UWord a -> b #

foldl' :: (b -> a -> b) -> b -> UWord a -> b #

foldr1 :: (a -> a -> a) -> UWord a -> a #

foldl1 :: (a -> a -> a) -> UWord a -> a #

toList :: UWord a -> [a] #

null :: UWord a -> Bool #

length :: UWord a -> Int #

elem :: Eq a => a -> UWord a -> Bool #

maximum :: Ord a => UWord a -> a #

minimum :: Ord a => UWord a -> a #

sum :: Num a => UWord a -> a #

product :: Num a => UWord a -> a #

Traversable (UWord :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> UWord a -> f (UWord b) #

sequenceA :: Applicative f => UWord (f a) -> f (UWord a) #

mapM :: Monad m => (a -> m b) -> UWord a -> m (UWord b) #

sequence :: Monad m => UWord (m a) -> m (UWord a) #

Functor (URec Word :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> URec Word a -> URec Word b #

(<$) :: a -> URec Word b -> URec Word a #

Generic (URec Word p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Word p) :: Type -> Type #

Methods

from :: URec Word p -> Rep (URec Word p) x #

to :: Rep (URec Word p) x -> URec Word p #

Show (URec Word p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> URec Word p -> ShowS #

show :: URec Word p -> String #

showList :: [URec Word p] -> ShowS #

Eq (URec Word p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: URec Word p -> URec Word p -> Bool #

(/=) :: URec Word p -> URec Word p -> Bool #

Ord (URec Word p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: URec Word p -> URec Word p -> Ordering #

(<) :: URec Word p -> URec Word p -> Bool #

(<=) :: URec Word p -> URec Word p -> Bool #

(>) :: URec Word p -> URec Word p -> Bool #

(>=) :: URec Word p -> URec Word p -> Bool #

max :: URec Word p -> URec Word p -> URec Word p #

min :: URec Word p -> URec Word p -> URec Word p #

type NatNumMaxBound Word 
Instance details

Defined in Basement.Nat

type Difference Word 
Instance details

Defined in Basement.Numerical.Subtractive

type PrimSize Word 
Instance details

Defined in Basement.PrimType

type PrimSize Word = 8
newtype Vector Word 
Instance details

Defined in Data.Vector.Unboxed.Base

data URec Word (p :: k)

Used for marking occurrences of Word#

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

data URec Word (p :: k) = UWord {}
newtype MVector s Word 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Word = MV_Word (MVector s Word)
type Rep1 (URec Word :: k -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

type Rep1 (URec Word :: k -> Type) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UWord" 'PrefixI 'True) (S1 ('MetaSel ('Just "uWord#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UWord :: k -> Type)))
type Rep (URec Word p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

type Rep (URec Word p) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UWord" 'PrefixI 'True) (S1 ('MetaSel ('Just "uWord#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UWord :: Type -> Type)))

data Word8 #

8-bit unsigned integer type

Instances

Instances details
TgaSaveable Pixel8 
Instance details

Defined in Codec.Picture.Tga

TiffSaveable Pixel8 
Instance details

Defined in Codec.Picture.Tiff

Unpackable Word8

The Word8 instance is just a passthrough, to avoid copying memory twice

Instance details

Defined in Codec.Picture.Tiff

Associated Types

type StorageType Word8

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

PackeablePixel Pixel8 
Instance details

Defined in Codec.Picture.Types

Associated Types

type PackedRepresentation Pixel8 #

Pixel Pixel8 
Instance details

Defined in Codec.Picture.Types

Associated Types

type PixelBaseComponent Pixel8 #

FromJSON Word8 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Word8 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Word8 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Word8 
Instance details

Defined in Data.Aeson.Types.ToJSON

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

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 () #

Bounded Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Enum Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Ix Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Num Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Read Word8

Since: base-2.1

Instance details

Defined in GHC.Read

Integral Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Real Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Methods

toRational :: Word8 -> Rational #

Show Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Methods

showsPrec :: Int -> Word8 -> ShowS #

show :: Word8 -> String #

showList :: [Word8] -> ShowS #

BitOps Word8 
Instance details

Defined in Basement.Bits

FiniteBitsOps Word8 
Instance details

Defined in Basement.Bits

Subtractive Word8 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Word8 #

Methods

(-) :: Word8 -> Word8 -> Difference Word8 #

PrimMemoryComparable Word8 
Instance details

Defined in Basement.PrimType

PrimType Word8 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Word8 :: Nat #

Default Word8 
Instance details

Defined in Data.Default.Class

Methods

def :: Word8 #

NFData Word8 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word8 -> () #

ToLogStr Word8

Since: fast-logger-2.4.14

Instance details

Defined in System.Log.FastLogger.LogStr

Methods

toLogStr :: Word8 -> LogStr #

Eq Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Methods

(==) :: Word8 -> Word8 -> Bool #

(/=) :: Word8 -> Word8 -> Bool #

Ord Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Methods

compare :: Word8 -> Word8 -> Ordering #

(<) :: Word8 -> Word8 -> Bool #

(<=) :: Word8 -> Word8 -> Bool #

(>) :: Word8 -> Word8 -> Bool #

(>=) :: Word8 -> Word8 -> Bool #

max :: Word8 -> Word8 -> Word8 #

min :: Word8 -> Word8 -> Word8 #

Hashable Word8 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word8 -> Int #

hash :: Word8 -> Int #

FromHttpApiData Word8 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Word8 
Instance details

Defined in Web.Internal.HttpApiData

PathPiece Word8 
Instance details

Defined in Web.PathPieces

PersistField Word8 
Instance details

Defined in Database.Persist.Class.PersistField

PersistFieldSql Word8 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Word8 -> SqlType #

Pretty Word8 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Word8 -> Doc ann #

prettyList :: [Word8] -> Doc ann #

Prim Word8 
Instance details

Defined in Data.Primitive.Types

Uniform Word8 
Instance details

Defined in System.Random.Internal

Methods

uniformM :: StatefulGen g m => g -> m Word8 #

UniformRange Word8 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Word8, Word8) -> g -> m Word8 #

ByteSource Word8 
Instance details

Defined in Data.UUID.Types.Internal.Builder

Methods

(/-/) :: ByteSink Word8 g -> Word8 -> g

Unbox Word8 
Instance details

Defined in Data.Vector.Unboxed.Base

ColorConvertible Pixel8 Pixel16 
Instance details

Defined in Codec.Picture.Types

ColorConvertible Pixel8 PixelF 
Instance details

Defined in Codec.Picture.Types

ColorConvertible Pixel8 PixelRGB16 
Instance details

Defined in Codec.Picture.Types

ColorConvertible Pixel8 PixelRGB8 
Instance details

Defined in Codec.Picture.Types

ColorConvertible Pixel8 PixelRGBA8 
Instance details

Defined in Codec.Picture.Types

ColorConvertible Pixel8 PixelYA8 
Instance details

Defined in Codec.Picture.Types

TransparentPixel PixelYA8 Pixel8 
Instance details

Defined in Codec.Picture.Types

Lift Word8 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Word8 -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Word8 -> Code m Word8 #

Vector Vector Word8 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Word8 
Instance details

Defined in Data.Vector.Unboxed.Base

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] #

ToBinary [Word8] 
Instance details

Defined in Codec.QRCode.Data.ToInput

Methods

toBinary :: [Word8] -> [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 PixelBaseComponent Pixel8 
Instance details

Defined in Codec.Picture.Types

type NatNumMaxBound Word8 
Instance details

Defined in Basement.Nat

type Difference Word8 
Instance details

Defined in Basement.Numerical.Subtractive

type PrimSize Word8 
Instance details

Defined in Basement.PrimType

type PrimSize Word8 = 1
newtype Vector Word8 
Instance details

Defined in Data.Vector.Unboxed.Base

type ByteSink Word8 g 
Instance details

Defined in Data.UUID.Types.Internal.Builder

type ByteSink Word8 g = Takes1Byte g
newtype MVector s Word8 
Instance details

Defined in Data.Vector.Unboxed.Base

data Word16 #

16-bit unsigned integer type

Instances

Instances details
TiffSaveable Pixel16 
Instance details

Defined in Codec.Picture.Tiff

Unpackable Word16 
Instance details

Defined in Codec.Picture.Tiff

Associated Types

type StorageType Word16

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

PackeablePixel Pixel16 
Instance details

Defined in Codec.Picture.Types

Associated Types

type PackedRepresentation Pixel16 #

Pixel Pixel16 
Instance details

Defined in Codec.Picture.Types

Associated Types

type PixelBaseComponent Pixel16 #

FromJSON Word16 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Word16 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Word16 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Word16 
Instance details

Defined in Data.Aeson.Types.ToJSON

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

Storable Word16

Since: base-2.1

Instance details

Defined in Foreign.Storable

Bounded Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Enum Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Ix Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Num Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Read Word16

Since: base-2.1

Instance details

Defined in GHC.Read

Integral Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Real Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Show Word16

Since: base-2.1

Instance details

Defined in GHC.Word

BitOps Word16 
Instance details

Defined in Basement.Bits

FiniteBitsOps Word16 
Instance details

Defined in Basement.Bits

Subtractive Word16 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Word16 #

PrimMemoryComparable Word16 
Instance details

Defined in Basement.PrimType

PrimType Word16 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Word16 :: Nat #

Default Word16 
Instance details

Defined in Data.Default.Class

Methods

def :: Word16 #

NFData Word16 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word16 -> () #

ToLogStr Word16

Since: fast-logger-2.4.14

Instance details

Defined in System.Log.FastLogger.LogStr

Methods

toLogStr :: Word16 -> LogStr #

Eq Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Methods

(==) :: Word16 -> Word16 -> Bool #

(/=) :: Word16 -> Word16 -> Bool #

Ord Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Hashable Word16 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word16 -> Int #

hash :: Word16 -> Int #

FromHttpApiData Word16 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Word16 
Instance details

Defined in Web.Internal.HttpApiData

PathPiece Word16 
Instance details

Defined in Web.PathPieces

PersistField Word16 
Instance details

Defined in Database.Persist.Class.PersistField

PersistFieldSql Word16 
Instance details

Defined in Database.Persist.Sql.Class

Pretty Word16 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Word16 -> Doc ann #

prettyList :: [Word16] -> Doc ann #

Prim Word16 
Instance details

Defined in Data.Primitive.Types

Uniform Word16 
Instance details

Defined in System.Random.Internal

Methods

uniformM :: StatefulGen g m => g -> m Word16 #

UniformRange Word16 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Word16, Word16) -> g -> m Word16 #

ByteSource Word16 
Instance details

Defined in Data.UUID.Types.Internal.Builder

Methods

(/-/) :: ByteSink Word16 g -> Word16 -> g

Unbox Word16 
Instance details

Defined in Data.Vector.Unboxed.Base

ColorConvertible Pixel16 PixelRGB16 
Instance details

Defined in Codec.Picture.Types

ColorConvertible Pixel16 PixelRGBA16 
Instance details

Defined in Codec.Picture.Types

ColorConvertible Pixel16 PixelYA16 
Instance details

Defined in Codec.Picture.Types

ColorConvertible Pixel8 Pixel16 
Instance details

Defined in Codec.Picture.Types

TransparentPixel PixelYA16 Pixel16 
Instance details

Defined in Codec.Picture.Types

Lift Word16 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Word16 -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Word16 -> Code m Word16 #

Vector Vector Word16 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Word16 
Instance details

Defined in Data.Vector.Unboxed.Base

type StorageType Word16 
Instance details

Defined in Codec.Picture.Tiff

type StorageType Word16 = Word16
type PackedRepresentation Pixel16 
Instance details

Defined in Codec.Picture.Types

type PixelBaseComponent Pixel16 
Instance details

Defined in Codec.Picture.Types

type NatNumMaxBound Word16 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Word16 = 65535
type Difference Word16 
Instance details

Defined in Basement.Numerical.Subtractive

type PrimSize Word16 
Instance details

Defined in Basement.PrimType

type PrimSize Word16 = 2
newtype Vector Word16 
Instance details

Defined in Data.Vector.Unboxed.Base

type ByteSink Word16 g 
Instance details

Defined in Data.UUID.Types.Internal.Builder

type ByteSink Word16 g = Takes2Bytes g
newtype MVector s Word16 
Instance details

Defined in Data.Vector.Unboxed.Base

data Word32 #

32-bit unsigned integer type

Instances

Instances details
TiffSaveable Pixel32 
Instance details

Defined in Codec.Picture.Tiff

Unpackable Word32 
Instance details

Defined in Codec.Picture.Tiff

Associated Types

type StorageType Word32

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

PackeablePixel Pixel32 
Instance details

Defined in Codec.Picture.Types

Associated Types

type PackedRepresentation Pixel32 #

Pixel Pixel32 
Instance details

Defined in Codec.Picture.Types

Associated Types

type PixelBaseComponent Pixel32 #

FromJSON Word32 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Word32 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Word32 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Word32 
Instance details

Defined in Data.Aeson.Types.ToJSON

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

Storable Word32

Since: base-2.1

Instance details

Defined in Foreign.Storable

Bounded Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Enum Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Ix Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Num Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Read Word32

Since: base-2.1

Instance details

Defined in GHC.Read

Integral Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Real Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Show Word32

Since: base-2.1

Instance details

Defined in GHC.Word

BitOps Word32 
Instance details

Defined in Basement.Bits

FiniteBitsOps Word32 
Instance details

Defined in Basement.Bits

Subtractive Word32 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Word32 #

PrimMemoryComparable Word32 
Instance details

Defined in Basement.PrimType

PrimType Word32 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Word32 :: Nat #

ToMarkup Word32 
Instance details

Defined in Text.Blaze

ToValue Word32 
Instance details

Defined in Text.Blaze

Default Word32 
Instance details

Defined in Data.Default.Class

Methods

def :: Word32 #

NFData Word32 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word32 -> () #

ToLogStr Word32

Since: fast-logger-2.4.14

Instance details

Defined in System.Log.FastLogger.LogStr

Methods

toLogStr :: Word32 -> LogStr #

Eq Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Methods

(==) :: Word32 -> Word32 -> Bool #

(/=) :: Word32 -> Word32 -> Bool #

Ord Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Hashable Word32 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word32 -> Int #

hash :: Word32 -> Int #

FromHttpApiData Word32 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Word32 
Instance details

Defined in Web.Internal.HttpApiData

PathPiece Word32 
Instance details

Defined in Web.PathPieces

PersistField Word32 
Instance details

Defined in Database.Persist.Class.PersistField

PersistFieldSql Word32 
Instance details

Defined in Database.Persist.Sql.Class

Pretty Word32 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Word32 -> Doc ann #

prettyList :: [Word32] -> Doc ann #

Prim Word32 
Instance details

Defined in Data.Primitive.Types

FieldDefault Word32 
Instance details

Defined in Data.ProtoLens.Message

Uniform Word32 
Instance details

Defined in System.Random.Internal

Methods

uniformM :: StatefulGen g m => g -> m Word32 #

UniformRange Word32 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Word32, Word32) -> g -> m Word32 #

ByteSource Word32 
Instance details

Defined in Data.UUID.Types.Internal.Builder

Methods

(/-/) :: ByteSink Word32 g -> Word32 -> g

Unbox Word32 
Instance details

Defined in Data.Vector.Unboxed.Base

Lift Word32 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Word32 -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Word32 -> Code m Word32 #

Vector Vector Word32 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Word32 
Instance details

Defined in Data.Vector.Unboxed.Base

From PortNumber Word32 Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

Methods

from :: PortNumber -> Word32

HasField FieldIndex "val" Word32 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

fieldOf :: Functor f => Proxy# "val" -> (Word32 -> f Word32) -> FieldIndex -> f FieldIndex

HasField LnPort "val" Word32 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

fieldOf :: Functor f => Proxy# "val" -> (Word32 -> f Word32) -> LnPort -> f LnPort

HasField BatchOpenChannel "remoteCsvDelay" Word32 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "remoteCsvDelay" -> (Word32 -> f Word32) -> BatchOpenChannel -> f BatchOpenChannel

HasField ChannelAcceptRequest "channelFlags" Word32 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "channelFlags" -> (Word32 -> f Word32) -> ChannelAcceptRequest -> f ChannelAcceptRequest

HasField ChannelAcceptRequest "csvDelay" Word32 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "csvDelay" -> (Word32 -> f Word32) -> ChannelAcceptRequest -> f ChannelAcceptRequest

HasField ChannelAcceptRequest "maxAcceptedHtlcs" Word32 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "maxAcceptedHtlcs" -> (Word32 -> f Word32) -> ChannelAcceptRequest -> f ChannelAcceptRequest

HasField ChannelAcceptResponse "csvDelay" Word32 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "csvDelay" -> (Word32 -> f Word32) -> ChannelAcceptResponse -> f ChannelAcceptResponse

HasField ChannelAcceptResponse "maxHtlcCount" Word32 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "maxHtlcCount" -> (Word32 -> f Word32) -> ChannelAcceptResponse -> f ChannelAcceptResponse

HasField ChannelAcceptResponse "minAcceptDepth" Word32 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "minAcceptDepth" -> (Word32 -> f Word32) -> ChannelAcceptResponse -> f ChannelAcceptResponse

HasField ConfirmationUpdate "numConfsLeft" Word32 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "numConfsLeft" -> (Word32 -> f Word32) -> ConfirmationUpdate -> f ConfirmationUpdate

HasField CustomMessage "type'" Word32 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "type'" -> (Word32 -> f Word32) -> CustomMessage -> f CustomMessage

HasField GetInfoResponse "blockHeight" Word32 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "blockHeight" -> (Word32 -> f Word32) -> GetInfoResponse -> f GetInfoResponse

HasField GetInfoResponse "numActiveChannels" Word32 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "numActiveChannels" -> (Word32 -> f Word32) -> GetInfoResponse -> f GetInfoResponse

HasField GetInfoResponse "numInactiveChannels" Word32 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "numInactiveChannels" -> (Word32 -> f Word32) -> GetInfoResponse -> f GetInfoResponse

HasField GetInfoResponse "numPeers" Word32 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "numPeers" -> (Word32 -> f Word32) -> GetInfoResponse -> f GetInfoResponse

HasField GetInfoResponse "numPendingChannels" Word32 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "numPendingChannels" -> (Word32 -> f Word32) -> GetInfoResponse -> f GetInfoResponse

HasField GetInfoResponse'FeaturesEntry "key" Word32 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "key" -> (Word32 -> f Word32) -> GetInfoResponse'FeaturesEntry -> f GetInfoResponse'FeaturesEntry

HasField OpenChannelRequest "maxLocalCsv" Word32 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "maxLocalCsv" -> (Word32 -> f Word32) -> OpenChannelRequest -> f OpenChannelRequest

HasField OpenChannelRequest "remoteCsvDelay" Word32 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "remoteCsvDelay" -> (Word32 -> f Word32) -> OpenChannelRequest -> f OpenChannelRequest

HasField OpenChannelRequest "remoteMaxHtlcs" Word32 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "remoteMaxHtlcs" -> (Word32 -> f Word32) -> OpenChannelRequest -> f OpenChannelRequest

HasField Peer'FeaturesEntry "key" Word32 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "key" -> (Word32 -> f Word32) -> Peer'FeaturesEntry -> f Peer'FeaturesEntry

HasField SendCustomMessageRequest "type'" Word32 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "type'" -> (Word32 -> f Word32) -> SendCustomMessageRequest -> f SendCustomMessageRequest

HasField SendRequest "cltvLimit" Word32 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "cltvLimit" -> (Word32 -> f Word32) -> SendRequest -> f SendRequest

HasField AMPRecord "childIndex" Word32 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "childIndex" -> (Word32 -> f Word32) -> AMPRecord -> f AMPRecord

HasField ChanPointShim "thawHeight" Word32 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "thawHeight" -> (Word32 -> f Word32) -> ChanPointShim -> f ChanPointShim

HasField Channel "csvDelay" Word32 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "csvDelay" -> (Word32 -> f Word32) -> Channel -> f Channel

HasField Channel "thawHeight" Word32 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "thawHeight" -> (Word32 -> f Word32) -> Channel -> f Channel

HasField ChannelCloseSummary "closeHeight" Word32 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "closeHeight" -> (Word32 -> f Word32) -> ChannelCloseSummary -> f ChannelCloseSummary

HasField ChannelConstraints "csvDelay" Word32 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "csvDelay" -> (Word32 -> f Word32) -> ChannelConstraints -> f ChannelConstraints

HasField ChannelConstraints "maxAcceptedHtlcs" Word32 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "maxAcceptedHtlcs" -> (Word32 -> f Word32) -> ChannelConstraints -> f ChannelConstraints

HasField ChannelEdge "lastUpdate" Word32 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "lastUpdate" -> (Word32 -> f Word32) -> ChannelEdge -> f ChannelEdge

HasField ChannelPoint "outputIndex" Word32 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "outputIndex" -> (Word32 -> f Word32) -> ChannelPoint -> f ChannelPoint

HasField ClosedChannelUpdate "closedHeight" Word32 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "closedHeight" -> (Word32 -> f Word32) -> ClosedChannelUpdate -> f ClosedChannelUpdate

HasField HTLC "expirationHeight" Word32 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "expirationHeight" -> (Word32 -> f Word32) -> HTLC -> f HTLC

HasField Hop "expiry" Word32 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "expiry" -> (Word32 -> f Word32) -> Hop -> f Hop

HasField HopHint "cltvExpiryDelta" Word32 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "cltvExpiryDelta" -> (Word32 -> f Word32) -> HopHint -> f HopHint

HasField HopHint "feeBaseMsat" Word32 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "feeBaseMsat" -> (Word32 -> f Word32) -> HopHint -> f HopHint

HasField HopHint "feeProportionalMillionths" Word32 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "feeProportionalMillionths" -> (Word32 -> f Word32) -> HopHint -> f HopHint

HasField LightningNode "lastUpdate" Word32 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "lastUpdate" -> (Word32 -> f Word32) -> LightningNode -> f LightningNode

HasField LightningNode'FeaturesEntry "key" Word32 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "key" -> (Word32 -> f Word32) -> LightningNode'FeaturesEntry -> f LightningNode'FeaturesEntry

HasField NetworkInfo "graphDiameter" Word32 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "graphDiameter" -> (Word32 -> f Word32) -> NetworkInfo -> f NetworkInfo

HasField NetworkInfo "maxOutDegree" Word32 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "maxOutDegree" -> (Word32 -> f Word32) -> NetworkInfo -> f NetworkInfo

HasField NetworkInfo "numChannels" Word32 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "numChannels" -> (Word32 -> f Word32) -> NetworkInfo -> f NetworkInfo

HasField NetworkInfo "numNodes" Word32 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "numNodes" -> (Word32 -> f Word32) -> NetworkInfo -> f NetworkInfo

HasField NodeInfo "numChannels" Word32 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "numChannels" -> (Word32 -> f Word32) -> NodeInfo -> f NodeInfo

HasField NodeUpdate'FeaturesEntry "key" Word32 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "key" -> (Word32 -> f Word32) -> NodeUpdate'FeaturesEntry -> f NodeUpdate'FeaturesEntry

HasField OutPoint "outputIndex" Word32 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "outputIndex" -> (Word32 -> f Word32) -> OutPoint -> f OutPoint

HasField PendingChannelsResponse'ForceClosedChannel "maturityHeight" Word32 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "maturityHeight" -> (Word32 -> f Word32) -> PendingChannelsResponse'ForceClosedChannel -> f PendingChannelsResponse'ForceClosedChannel

HasField PendingChannelsResponse'PendingOpenChannel "confirmationHeight" Word32 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "confirmationHeight" -> (Word32 -> f Word32) -> PendingChannelsResponse'PendingOpenChannel -> f PendingChannelsResponse'PendingOpenChannel

HasField PendingHTLC "maturityHeight" Word32 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "maturityHeight" -> (Word32 -> f Word32) -> PendingHTLC -> f PendingHTLC

HasField PendingHTLC "stage" Word32 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "stage" -> (Word32 -> f Word32) -> PendingHTLC -> f PendingHTLC

HasField PendingUpdate "outputIndex" Word32 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "outputIndex" -> (Word32 -> f Word32) -> PendingUpdate -> f PendingUpdate

HasField QueryRoutesRequest "cltvLimit" Word32 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "cltvLimit" -> (Word32 -> f Word32) -> QueryRoutesRequest -> f QueryRoutesRequest

HasField Route "totalTimeLock" Word32 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "totalTimeLock" -> (Word32 -> f Word32) -> Route -> f Route

HasField RoutingPolicy "lastUpdate" Word32 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "lastUpdate" -> (Word32 -> f Word32) -> RoutingPolicy -> f RoutingPolicy

HasField RoutingPolicy "timeLockDelta" Word32 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "timeLockDelta" -> (Word32 -> f Word32) -> RoutingPolicy -> f RoutingPolicy

HasField AMP "childIndex" Word32 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "childIndex" -> (Word32 -> f Word32) -> AMP -> f AMP

HasField ChannelUpdate "baseFee" Word32 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "baseFee" -> (Word32 -> f Word32) -> ChannelUpdate -> f ChannelUpdate

HasField ChannelUpdate "channelFlags" Word32 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "channelFlags" -> (Word32 -> f Word32) -> ChannelUpdate -> f ChannelUpdate

HasField ChannelUpdate "feeRate" Word32 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "feeRate" -> (Word32 -> f Word32) -> ChannelUpdate -> f ChannelUpdate

HasField ChannelUpdate "messageFlags" Word32 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "messageFlags" -> (Word32 -> f Word32) -> ChannelUpdate -> f ChannelUpdate

HasField ChannelUpdate "timeLockDelta" Word32 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "timeLockDelta" -> (Word32 -> f Word32) -> ChannelUpdate -> f ChannelUpdate

HasField ChannelUpdate "timestamp" Word32 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "timestamp" -> (Word32 -> f Word32) -> ChannelUpdate -> f ChannelUpdate

HasField Failure "cltvExpiry" Word32 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "cltvExpiry" -> (Word32 -> f Word32) -> Failure -> f Failure

HasField Failure "failureSourceIndex" Word32 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "failureSourceIndex" -> (Word32 -> f Word32) -> Failure -> f Failure

HasField Failure "flags" Word32 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "flags" -> (Word32 -> f Word32) -> Failure -> f Failure

HasField Failure "height" Word32 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "height" -> (Word32 -> f Word32) -> Failure -> f Failure

HasField ForwardingHistoryRequest "indexOffset" Word32 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "indexOffset" -> (Word32 -> f Word32) -> ForwardingHistoryRequest -> f ForwardingHistoryRequest

HasField ForwardingHistoryRequest "numMaxEvents" Word32 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "numMaxEvents" -> (Word32 -> f Word32) -> ForwardingHistoryRequest -> f ForwardingHistoryRequest

HasField ForwardingHistoryResponse "lastOffsetIndex" Word32 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "lastOffsetIndex" -> (Word32 -> f Word32) -> ForwardingHistoryResponse -> f ForwardingHistoryResponse

HasField Invoice'FeaturesEntry "key" Word32 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "key" -> (Word32 -> f Word32) -> Invoice'FeaturesEntry -> f Invoice'FeaturesEntry

HasField PayReq'FeaturesEntry "key" Word32 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "key" -> (Word32 -> f Word32) -> PayReq'FeaturesEntry -> f PayReq'FeaturesEntry

HasField PolicyUpdateRequest "timeLockDelta" Word32 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "timeLockDelta" -> (Word32 -> f Word32) -> PolicyUpdateRequest -> f PolicyUpdateRequest

HasField ForwardHtlcInterceptRequest "incomingExpiry" Word32 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "incomingExpiry" -> (Word32 -> f Word32) -> ForwardHtlcInterceptRequest -> f ForwardHtlcInterceptRequest

HasField ForwardHtlcInterceptRequest "outgoingExpiry" Word32 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "outgoingExpiry" -> (Word32 -> f Word32) -> ForwardHtlcInterceptRequest -> f ForwardHtlcInterceptRequest

HasField HtlcInfo "incomingTimelock" Word32 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "incomingTimelock" -> (Word32 -> f Word32) -> HtlcInfo -> f HtlcInfo

HasField HtlcInfo "outgoingTimelock" Word32 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "outgoingTimelock" -> (Word32 -> f Word32) -> HtlcInfo -> f HtlcInfo

HasField MissionControlConfig "maximumPaymentResults" Word32 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "maximumPaymentResults" -> (Word32 -> f Word32) -> MissionControlConfig -> f MissionControlConfig

HasField SendPaymentRequest "maxParts" Word32 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "maxParts" -> (Word32 -> f Word32) -> SendPaymentRequest -> f SendPaymentRequest

HasField SignDescriptor "sighash" Word32 
Instance details

Defined in Proto.Signrpc.Signer

Methods

fieldOf :: Functor f => Proxy# "sighash" -> (Word32 -> f Word32) -> SignDescriptor -> f SignDescriptor

HasField Account "externalKeyCount" Word32 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "externalKeyCount" -> (Word32 -> f Word32) -> Account -> f Account

HasField Account "internalKeyCount" Word32 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "internalKeyCount" -> (Word32 -> f Word32) -> Account -> f Account

HasField BumpFeeRequest "satPerByte" Word32 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "satPerByte" -> (Word32 -> f Word32) -> BumpFeeRequest -> f BumpFeeRequest

HasField BumpFeeRequest "targetConf" Word32 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "targetConf" -> (Word32 -> f Word32) -> BumpFeeRequest -> f BumpFeeRequest

HasField FundPsbtRequest "targetConf" Word32 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "targetConf" -> (Word32 -> f Word32) -> FundPsbtRequest -> f FundPsbtRequest

HasField PendingSweep "amountSat" Word32 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "amountSat" -> (Word32 -> f Word32) -> PendingSweep -> f PendingSweep

HasField PendingSweep "broadcastAttempts" Word32 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "broadcastAttempts" -> (Word32 -> f Word32) -> PendingSweep -> f PendingSweep

HasField PendingSweep "nextBroadcastHeight" Word32 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "nextBroadcastHeight" -> (Word32 -> f Word32) -> PendingSweep -> f PendingSweep

HasField PendingSweep "requestedConfTarget" Word32 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "requestedConfTarget" -> (Word32 -> f Word32) -> PendingSweep -> f PendingSweep

HasField PendingSweep "requestedSatPerByte" Word32 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "requestedSatPerByte" -> (Word32 -> f Word32) -> PendingSweep -> f PendingSweep

HasField PendingSweep "satPerByte" Word32 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "satPerByte" -> (Word32 -> f Word32) -> PendingSweep -> f PendingSweep

HasField WatchOnlyAccount "account" Word32 
Instance details

Defined in Proto.Walletunlocker

Methods

fieldOf :: Functor f => Proxy# "account" -> (Word32 -> f Word32) -> WatchOnlyAccount -> f WatchOnlyAccount

HasField WatchOnlyAccount "coinType" Word32 
Instance details

Defined in Proto.Walletunlocker

Methods

fieldOf :: Functor f => Proxy# "coinType" -> (Word32 -> f Word32) -> WatchOnlyAccount -> f WatchOnlyAccount

HasField WatchOnlyAccount "purpose" Word32 
Instance details

Defined in Proto.Walletunlocker

Methods

fieldOf :: Functor f => Proxy# "purpose" -> (Word32 -> f Word32) -> WatchOnlyAccount -> f WatchOnlyAccount

HasField FundPsbtRequest "maybe'targetConf" (Maybe Word32) 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "maybe'targetConf" -> (Maybe Word32 -> f (Maybe Word32)) -> FundPsbtRequest -> f FundPsbtRequest

HasField GetInfoResponse "features" (Map Word32 Feature) 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "features" -> (Map Word32 Feature -> f (Map Word32 Feature)) -> GetInfoResponse -> f GetInfoResponse

HasField Peer "features" (Map Word32 Feature) 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "features" -> (Map Word32 Feature -> f (Map Word32 Feature)) -> Peer -> f Peer

HasField LightningNode "features" (Map Word32 Feature) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "features" -> (Map Word32 Feature -> f (Map Word32 Feature)) -> LightningNode -> f LightningNode

HasField NodeUpdate "features" (Map Word32 Feature) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "features" -> (Map Word32 Feature -> f (Map Word32 Feature)) -> NodeUpdate -> f NodeUpdate

HasField Invoice "features" (Map Word32 Feature) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "features" -> (Map Word32 Feature -> f (Map Word32 Feature)) -> Invoice -> f Invoice

HasField PayReq "features" (Map Word32 Feature) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "features" -> (Map Word32 Feature -> f (Map Word32 Feature)) -> PayReq -> f PayReq

From Word32 (Vout 'Funding) Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Methods

from :: Word32 -> Vout 'Funding

FromGrpc (Vout a) Word32 
Instance details

Defined in LndClient.Data.Newtype

ToGrpc (Vout a) Word32 
Instance details

Defined in LndClient.Data.Newtype

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 PixelBaseComponent Pixel32 
Instance details

Defined in Codec.Picture.Types

type NatNumMaxBound Word32 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Word32 = 4294967295
type Difference Word32 
Instance details

Defined in Basement.Numerical.Subtractive

type PrimSize Word32 
Instance details

Defined in Basement.PrimType

type PrimSize Word32 = 4
newtype Vector Word32 
Instance details

Defined in Data.Vector.Unboxed.Base

type ByteSink Word32 g 
Instance details

Defined in Data.UUID.Types.Internal.Builder

type ByteSink Word32 g = Takes4Bytes g
newtype MVector s Word32 
Instance details

Defined in Data.Vector.Unboxed.Base

data Word64 #

64-bit unsigned integer type

Instances

Instances details
FromJSON Word64 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Word64 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Word64 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Word64 
Instance details

Defined in Data.Aeson.Types.ToJSON

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

Storable Word64

Since: base-2.1

Instance details

Defined in Foreign.Storable

Bounded Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Enum Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Ix Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Num Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Read Word64

Since: base-2.1

Instance details

Defined in GHC.Read

Integral Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Real Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Show Word64

Since: base-2.1

Instance details

Defined in GHC.Word

BitOps Word64 
Instance details

Defined in Basement.Bits

FiniteBitsOps Word64 
Instance details

Defined in Basement.Bits

Subtractive Word64 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Word64 #

PrimMemoryComparable Word64 
Instance details

Defined in Basement.PrimType

PrimType Word64 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Word64 :: Nat #

ToMarkup Word64 
Instance details

Defined in Text.Blaze

ToValue Word64 
Instance details

Defined in Text.Blaze

Default Word64 
Instance details

Defined in Data.Default.Class

Methods

def :: Word64 #

NFData Word64 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word64 -> () #

ToLogStr Word64

Since: fast-logger-2.4.14

Instance details

Defined in System.Log.FastLogger.LogStr

Methods

toLogStr :: Word64 -> LogStr #

Eq Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Methods

(==) :: Word64 -> Word64 -> Bool #

(/=) :: Word64 -> Word64 -> Bool #

Ord Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Hashable Word64 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word64 -> Int #

hash :: Word64 -> Int #

FromHttpApiData Word64 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Word64 
Instance details

Defined in Web.Internal.HttpApiData

PathPiece Word64 
Instance details

Defined in Web.PathPieces

PersistField Word64 
Instance details

Defined in Database.Persist.Class.PersistField

PersistFieldSql Word64 
Instance details

Defined in Database.Persist.Sql.Class

Pretty Word64 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Word64 -> Doc ann #

prettyList :: [Word64] -> Doc ann #

Prim Word64 
Instance details

Defined in Data.Primitive.Types

FieldDefault Word64 
Instance details

Defined in Data.ProtoLens.Message

Uniform Word64 
Instance details

Defined in System.Random.Internal

Methods

uniformM :: StatefulGen g m => g -> m Word64 #

UniformRange Word64 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Word64, Word64) -> g -> m Word64 #

ByteSource Word64 
Instance details

Defined in Data.UUID.Types.Internal.Builder

Methods

(/-/) :: ByteSink Word64 g -> Word64 -> g

Unbox Word64 
Instance details

Defined in Data.Vector.Unboxed.Base

FromGrpc AddIndex Word64 
Instance details

Defined in LndClient.Data.Newtype

Methods

fromGrpc :: Word64 -> Either LndError AddIndex

FromGrpc ChanId Word64 
Instance details

Defined in LndClient.Data.Newtype

FromGrpc SettleIndex Word64 
Instance details

Defined in LndClient.Data.Newtype

Methods

fromGrpc :: Word64 -> Either LndError SettleIndex

ToGrpc AddIndex Word64 
Instance details

Defined in LndClient.Data.Newtype

Methods

toGrpc :: AddIndex -> Either LndError Word64

ToGrpc ChanId Word64 
Instance details

Defined in LndClient.Data.Newtype

ToGrpc SettleIndex Word64 
Instance details

Defined in LndClient.Data.Newtype

Methods

toGrpc :: SettleIndex -> Either LndError Word64

Lift Word64 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Word64 -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Word64 -> Code m Word64 #

Vector Vector Word64 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Word64 
Instance details

Defined in Data.Vector.Unboxed.Base

From Word64 BlkHeight Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Word64 -> BlkHeight

From Word64 Nonce Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Word64 -> Nonce

From Word64 MSat Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Methods

from :: Word64 -> MSat

From Word64 Seconds Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Methods

from :: Word64 -> Seconds

From BlkHeight Word64 Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: BlkHeight -> Word64

From Nonce Word64 Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Nonce -> Word64

From MSat Word64 Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Methods

from :: MSat -> Word64

From Seconds Word64 Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Methods

from :: Seconds -> Word64

HasField Nonce "val" Word64 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

fieldOf :: Functor f => Proxy# "val" -> (Word64 -> f Word64) -> Nonce -> f Nonce

HasField Msat "val" Word64 
Instance details

Defined in Proto.BtcLsp.Data.LowLevel

Methods

fieldOf :: Functor f => Proxy# "val" -> (Word64 -> f Word64) -> Msat -> f Msat

HasField Urational "denominator" Word64 
Instance details

Defined in Proto.BtcLsp.Data.LowLevel

Methods

fieldOf :: Functor f => Proxy# "denominator" -> (Word64 -> f Word64) -> Urational -> f Urational

HasField Urational "numerator" Word64 
Instance details

Defined in Proto.BtcLsp.Data.LowLevel

Methods

fieldOf :: Functor f => Proxy# "numerator" -> (Word64 -> f Word64) -> Urational -> f Urational

HasField AddHoldInvoiceRequest "cltvExpiry" Word64 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

fieldOf :: Functor f => Proxy# "cltvExpiry" -> (Word64 -> f Word64) -> AddHoldInvoiceRequest -> f AddHoldInvoiceRequest

HasField AddHoldInvoiceResp "addIndex" Word64 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

fieldOf :: Functor f => Proxy# "addIndex" -> (Word64 -> f Word64) -> AddHoldInvoiceResp -> f AddHoldInvoiceResp

HasField ChannelAcceptRequest "channelReserve" Word64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "channelReserve" -> (Word64 -> f Word64) -> ChannelAcceptRequest -> f ChannelAcceptRequest

HasField ChannelAcceptRequest "dustLimit" Word64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "dustLimit" -> (Word64 -> f Word64) -> ChannelAcceptRequest -> f ChannelAcceptRequest

HasField ChannelAcceptRequest "feePerKw" Word64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "feePerKw" -> (Word64 -> f Word64) -> ChannelAcceptRequest -> f ChannelAcceptRequest

HasField ChannelAcceptRequest "fundingAmt" Word64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "fundingAmt" -> (Word64 -> f Word64) -> ChannelAcceptRequest -> f ChannelAcceptRequest

HasField ChannelAcceptRequest "maxValueInFlight" Word64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "maxValueInFlight" -> (Word64 -> f Word64) -> ChannelAcceptRequest -> f ChannelAcceptRequest

HasField ChannelAcceptRequest "minHtlc" Word64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "minHtlc" -> (Word64 -> f Word64) -> ChannelAcceptRequest -> f ChannelAcceptRequest

HasField ChannelAcceptRequest "pushAmt" Word64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "pushAmt" -> (Word64 -> f Word64) -> ChannelAcceptRequest -> f ChannelAcceptRequest

HasField ChannelAcceptResponse "inFlightMaxMsat" Word64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "inFlightMaxMsat" -> (Word64 -> f Word64) -> ChannelAcceptResponse -> f ChannelAcceptResponse

HasField ChannelAcceptResponse "minHtlcIn" Word64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "minHtlcIn" -> (Word64 -> f Word64) -> ChannelAcceptResponse -> f ChannelAcceptResponse

HasField ChannelAcceptResponse "reserveSat" Word64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "reserveSat" -> (Word64 -> f Word64) -> ChannelAcceptResponse -> f ChannelAcceptResponse

HasField CloseChannelRequest "satPerVbyte" Word64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "satPerVbyte" -> (Word64 -> f Word64) -> CloseChannelRequest -> f CloseChannelRequest

HasField ConnectPeerRequest "timeout" Word64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "timeout" -> (Word64 -> f Word64) -> ConnectPeerRequest -> f ConnectPeerRequest

HasField EstimateFeeResponse "satPerVbyte" Word64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "satPerVbyte" -> (Word64 -> f Word64) -> EstimateFeeResponse -> f EstimateFeeResponse

HasField OpenChannelRequest "remoteMaxValueInFlightMsat" Word64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "remoteMaxValueInFlightMsat" -> (Word64 -> f Word64) -> OpenChannelRequest -> f OpenChannelRequest

HasField OpenChannelRequest "satPerVbyte" Word64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "satPerVbyte" -> (Word64 -> f Word64) -> OpenChannelRequest -> f OpenChannelRequest

HasField Peer "bytesRecv" Word64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "bytesRecv" -> (Word64 -> f Word64) -> Peer -> f Peer

HasField Peer "bytesSent" Word64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "bytesSent" -> (Word64 -> f Word64) -> Peer -> f Peer

HasField SendCoinsRequest "satPerVbyte" Word64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "satPerVbyte" -> (Word64 -> f Word64) -> SendCoinsRequest -> f SendCoinsRequest

HasField SendManyRequest "satPerVbyte" Word64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "satPerVbyte" -> (Word64 -> f Word64) -> SendManyRequest -> f SendManyRequest

HasField SendRequest "outgoingChanId" Word64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "outgoingChanId" -> (Word64 -> f Word64) -> SendRequest -> f SendRequest

HasField SendRequest'DestCustomRecordsEntry "key" Word64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "key" -> (Word64 -> f Word64) -> SendRequest'DestCustomRecordsEntry -> f SendRequest'DestCustomRecordsEntry

HasField TimestampedError "timestamp" Word64 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "timestamp" -> (Word64 -> f Word64) -> TimestampedError -> f TimestampedError

HasField Amount "msat" Word64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "msat" -> (Word64 -> f Word64) -> Amount -> f Amount

HasField Amount "sat" Word64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "sat" -> (Word64 -> f Word64) -> Amount -> f Amount

HasField ChanInfoRequest "chanId" Word64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "chanId" -> (Word64 -> f Word64) -> ChanInfoRequest -> f ChanInfoRequest

HasField Channel "chanId" Word64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "chanId" -> (Word64 -> f Word64) -> Channel -> f Channel

HasField Channel "numUpdates" Word64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "numUpdates" -> (Word64 -> f Word64) -> Channel -> f Channel

HasField Channel "pushAmountSat" Word64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "pushAmountSat" -> (Word64 -> f Word64) -> Channel -> f Channel

HasField ChannelCloseSummary "chanId" Word64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "chanId" -> (Word64 -> f Word64) -> ChannelCloseSummary -> f ChannelCloseSummary

HasField ChannelConstraints "chanReserveSat" Word64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "chanReserveSat" -> (Word64 -> f Word64) -> ChannelConstraints -> f ChannelConstraints

HasField ChannelConstraints "dustLimitSat" Word64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "dustLimitSat" -> (Word64 -> f Word64) -> ChannelConstraints -> f ChannelConstraints

HasField ChannelConstraints "maxPendingAmtMsat" Word64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "maxPendingAmtMsat" -> (Word64 -> f Word64) -> ChannelConstraints -> f ChannelConstraints

HasField ChannelConstraints "minHtlcMsat" Word64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "minHtlcMsat" -> (Word64 -> f Word64) -> ChannelConstraints -> f ChannelConstraints

HasField ChannelEdge "channelId" Word64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "channelId" -> (Word64 -> f Word64) -> ChannelEdge -> f ChannelEdge

HasField ChannelEdgeUpdate "chanId" Word64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "chanId" -> (Word64 -> f Word64) -> ChannelEdgeUpdate -> f ChannelEdgeUpdate

HasField ClosedChannelUpdate "chanId" Word64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "chanId" -> (Word64 -> f Word64) -> ClosedChannelUpdate -> f ClosedChannelUpdate

HasField EdgeLocator "channelId" Word64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "channelId" -> (Word64 -> f Word64) -> EdgeLocator -> f EdgeLocator

HasField HTLC "forwardingChannel" Word64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "forwardingChannel" -> (Word64 -> f Word64) -> HTLC -> f HTLC

HasField HTLC "forwardingHtlcIndex" Word64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "forwardingHtlcIndex" -> (Word64 -> f Word64) -> HTLC -> f HTLC

HasField HTLC "htlcIndex" Word64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "htlcIndex" -> (Word64 -> f Word64) -> HTLC -> f HTLC

HasField Hop "chanId" Word64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "chanId" -> (Word64 -> f Word64) -> Hop -> f Hop

HasField Hop'CustomRecordsEntry "key" Word64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "key" -> (Word64 -> f Word64) -> Hop'CustomRecordsEntry -> f Hop'CustomRecordsEntry

HasField HopHint "chanId" Word64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "chanId" -> (Word64 -> f Word64) -> HopHint -> f HopHint

HasField NetworkInfo "numZombieChans" Word64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "numZombieChans" -> (Word64 -> f Word64) -> NetworkInfo -> f NetworkInfo

HasField PendingChannelsResponse'Commitments "localCommitFeeSat" Word64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "localCommitFeeSat" -> (Word64 -> f Word64) -> PendingChannelsResponse'Commitments -> f PendingChannelsResponse'Commitments

HasField PendingChannelsResponse'Commitments "remoteCommitFeeSat" Word64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "remoteCommitFeeSat" -> (Word64 -> f Word64) -> PendingChannelsResponse'Commitments -> f PendingChannelsResponse'Commitments

HasField PendingChannelsResponse'Commitments "remotePendingCommitFeeSat" Word64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "remotePendingCommitFeeSat" -> (Word64 -> f Word64) -> PendingChannelsResponse'Commitments -> f PendingChannelsResponse'Commitments

HasField QueryRoutesRequest "outgoingChanId" Word64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "outgoingChanId" -> (Word64 -> f Word64) -> QueryRoutesRequest -> f QueryRoutesRequest

HasField QueryRoutesRequest'DestCustomRecordsEntry "key" Word64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "key" -> (Word64 -> f Word64) -> QueryRoutesRequest'DestCustomRecordsEntry -> f QueryRoutesRequest'DestCustomRecordsEntry

HasField Resolution "amountSat" Word64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "amountSat" -> (Word64 -> f Word64) -> Resolution -> f Resolution

HasField RoutingPolicy "maxHtlcMsat" Word64 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "maxHtlcMsat" -> (Word64 -> f Word64) -> RoutingPolicy -> f RoutingPolicy

HasField AMPInvoiceState "settleIndex" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "settleIndex" -> (Word64 -> f Word64) -> AMPInvoiceState -> f AMPInvoiceState

HasField AddInvoiceResponse "addIndex" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "addIndex" -> (Word64 -> f Word64) -> AddInvoiceResponse -> f AddInvoiceResponse

HasField BakeMacaroonRequest "rootKeyId" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "rootKeyId" -> (Word64 -> f Word64) -> BakeMacaroonRequest -> f BakeMacaroonRequest

HasField ChannelFeeReport "chanId" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "chanId" -> (Word64 -> f Word64) -> ChannelFeeReport -> f ChannelFeeReport

HasField ChannelUpdate "chanId" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "chanId" -> (Word64 -> f Word64) -> ChannelUpdate -> f ChannelUpdate

HasField ChannelUpdate "htlcMaximumMsat" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "htlcMaximumMsat" -> (Word64 -> f Word64) -> ChannelUpdate -> f ChannelUpdate

HasField ChannelUpdate "htlcMinimumMsat" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "htlcMinimumMsat" -> (Word64 -> f Word64) -> ChannelUpdate -> f ChannelUpdate

HasField DeleteMacaroonIDRequest "rootKeyId" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "rootKeyId" -> (Word64 -> f Word64) -> DeleteMacaroonIDRequest -> f DeleteMacaroonIDRequest

HasField Failure "htlcMsat" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "htlcMsat" -> (Word64 -> f Word64) -> Failure -> f Failure

HasField FeeReportResponse "dayFeeSum" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "dayFeeSum" -> (Word64 -> f Word64) -> FeeReportResponse -> f FeeReportResponse

HasField FeeReportResponse "monthFeeSum" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "monthFeeSum" -> (Word64 -> f Word64) -> FeeReportResponse -> f FeeReportResponse

HasField FeeReportResponse "weekFeeSum" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "weekFeeSum" -> (Word64 -> f Word64) -> FeeReportResponse -> f FeeReportResponse

HasField ForwardingEvent "amtIn" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "amtIn" -> (Word64 -> f Word64) -> ForwardingEvent -> f ForwardingEvent

HasField ForwardingEvent "amtInMsat" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "amtInMsat" -> (Word64 -> f Word64) -> ForwardingEvent -> f ForwardingEvent

HasField ForwardingEvent "amtOut" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "amtOut" -> (Word64 -> f Word64) -> ForwardingEvent -> f ForwardingEvent

HasField ForwardingEvent "amtOutMsat" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "amtOutMsat" -> (Word64 -> f Word64) -> ForwardingEvent -> f ForwardingEvent

HasField ForwardingEvent "chanIdIn" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "chanIdIn" -> (Word64 -> f Word64) -> ForwardingEvent -> f ForwardingEvent

HasField ForwardingEvent "chanIdOut" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "chanIdOut" -> (Word64 -> f Word64) -> ForwardingEvent -> f ForwardingEvent

HasField ForwardingEvent "fee" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "fee" -> (Word64 -> f Word64) -> ForwardingEvent -> f ForwardingEvent

HasField ForwardingEvent "feeMsat" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "feeMsat" -> (Word64 -> f Word64) -> ForwardingEvent -> f ForwardingEvent

HasField ForwardingEvent "timestamp" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "timestamp" -> (Word64 -> f Word64) -> ForwardingEvent -> f ForwardingEvent

HasField ForwardingEvent "timestampNs" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "timestampNs" -> (Word64 -> f Word64) -> ForwardingEvent -> f ForwardingEvent

HasField ForwardingHistoryRequest "endTime" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "endTime" -> (Word64 -> f Word64) -> ForwardingHistoryRequest -> f ForwardingHistoryRequest

HasField ForwardingHistoryRequest "startTime" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "startTime" -> (Word64 -> f Word64) -> ForwardingHistoryRequest -> f ForwardingHistoryRequest

HasField HTLCAttempt "attemptId" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "attemptId" -> (Word64 -> f Word64) -> HTLCAttempt -> f HTLCAttempt

HasField Invoice "addIndex" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "addIndex" -> (Word64 -> f Word64) -> Invoice -> f Invoice

HasField Invoice "cltvExpiry" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "cltvExpiry" -> (Word64 -> f Word64) -> Invoice -> f Invoice

HasField Invoice "settleIndex" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "settleIndex" -> (Word64 -> f Word64) -> Invoice -> f Invoice

HasField InvoiceHTLC "amtMsat" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "amtMsat" -> (Word64 -> f Word64) -> InvoiceHTLC -> f InvoiceHTLC

HasField InvoiceHTLC "chanId" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "chanId" -> (Word64 -> f Word64) -> InvoiceHTLC -> f InvoiceHTLC

HasField InvoiceHTLC "htlcIndex" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "htlcIndex" -> (Word64 -> f Word64) -> InvoiceHTLC -> f InvoiceHTLC

HasField InvoiceHTLC "mppTotalAmtMsat" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "mppTotalAmtMsat" -> (Word64 -> f Word64) -> InvoiceHTLC -> f InvoiceHTLC

HasField InvoiceHTLC'CustomRecordsEntry "key" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "key" -> (Word64 -> f Word64) -> InvoiceHTLC'CustomRecordsEntry -> f InvoiceHTLC'CustomRecordsEntry

HasField InvoiceSubscription "addIndex" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "addIndex" -> (Word64 -> f Word64) -> InvoiceSubscription -> f InvoiceSubscription

HasField InvoiceSubscription "settleIndex" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "settleIndex" -> (Word64 -> f Word64) -> InvoiceSubscription -> f InvoiceSubscription

HasField ListInvoiceRequest "indexOffset" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "indexOffset" -> (Word64 -> f Word64) -> ListInvoiceRequest -> f ListInvoiceRequest

HasField ListInvoiceRequest "numMaxInvoices" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "numMaxInvoices" -> (Word64 -> f Word64) -> ListInvoiceRequest -> f ListInvoiceRequest

HasField ListInvoiceResponse "firstIndexOffset" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "firstIndexOffset" -> (Word64 -> f Word64) -> ListInvoiceResponse -> f ListInvoiceResponse

HasField ListInvoiceResponse "lastIndexOffset" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "lastIndexOffset" -> (Word64 -> f Word64) -> ListInvoiceResponse -> f ListInvoiceResponse

HasField ListPaymentsRequest "indexOffset" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "indexOffset" -> (Word64 -> f Word64) -> ListPaymentsRequest -> f ListPaymentsRequest

HasField ListPaymentsRequest "maxPayments" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "maxPayments" -> (Word64 -> f Word64) -> ListPaymentsRequest -> f ListPaymentsRequest

HasField ListPaymentsResponse "firstIndexOffset" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "firstIndexOffset" -> (Word64 -> f Word64) -> ListPaymentsResponse -> f ListPaymentsResponse

HasField ListPaymentsResponse "lastIndexOffset" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "lastIndexOffset" -> (Word64 -> f Word64) -> ListPaymentsResponse -> f ListPaymentsResponse

HasField Payment "paymentIndex" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "paymentIndex" -> (Word64 -> f Word64) -> Payment -> f Payment

HasField PolicyUpdateRequest "maxHtlcMsat" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "maxHtlcMsat" -> (Word64 -> f Word64) -> PolicyUpdateRequest -> f PolicyUpdateRequest

HasField PolicyUpdateRequest "minHtlcMsat" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "minHtlcMsat" -> (Word64 -> f Word64) -> PolicyUpdateRequest -> f PolicyUpdateRequest

HasField RPCMiddlewareRequest "msgId" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "msgId" -> (Word64 -> f Word64) -> RPCMiddlewareRequest -> f RPCMiddlewareRequest

HasField RPCMiddlewareRequest "requestId" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "requestId" -> (Word64 -> f Word64) -> RPCMiddlewareRequest -> f RPCMiddlewareRequest

HasField RPCMiddlewareResponse "refMsgId" Word64 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "refMsgId" -> (Word64 -> f Word64) -> RPCMiddlewareResponse -> f RPCMiddlewareResponse

HasField BuildRouteRequest "outgoingChanId" Word64 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "outgoingChanId" -> (Word64 -> f Word64) -> BuildRouteRequest -> f BuildRouteRequest

HasField CircuitKey "chanId" Word64 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "chanId" -> (Word64 -> f Word64) -> CircuitKey -> f CircuitKey

HasField CircuitKey "htlcId" Word64 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "htlcId" -> (Word64 -> f Word64) -> CircuitKey -> f CircuitKey

HasField ForwardHtlcInterceptRequest "incomingAmountMsat" Word64 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "incomingAmountMsat" -> (Word64 -> f Word64) -> ForwardHtlcInterceptRequest -> f ForwardHtlcInterceptRequest

HasField ForwardHtlcInterceptRequest "outgoingAmountMsat" Word64 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "outgoingAmountMsat" -> (Word64 -> f Word64) -> ForwardHtlcInterceptRequest -> f ForwardHtlcInterceptRequest

HasField ForwardHtlcInterceptRequest "outgoingRequestedChanId" Word64 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "outgoingRequestedChanId" -> (Word64 -> f Word64) -> ForwardHtlcInterceptRequest -> f ForwardHtlcInterceptRequest

HasField ForwardHtlcInterceptRequest'CustomRecordsEntry "key" Word64 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "key" -> (Word64 -> f Word64) -> ForwardHtlcInterceptRequest'CustomRecordsEntry -> f ForwardHtlcInterceptRequest'CustomRecordsEntry

HasField HtlcEvent "incomingChannelId" Word64 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "incomingChannelId" -> (Word64 -> f Word64) -> HtlcEvent -> f HtlcEvent

HasField HtlcEvent "incomingHtlcId" Word64 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "incomingHtlcId" -> (Word64 -> f Word64) -> HtlcEvent -> f HtlcEvent

HasField HtlcEvent "outgoingChannelId" Word64 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "outgoingChannelId" -> (Word64 -> f Word64) -> HtlcEvent -> f HtlcEvent

HasField HtlcEvent "outgoingHtlcId" Word64 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "outgoingHtlcId" -> (Word64 -> f Word64) -> HtlcEvent -> f HtlcEvent

HasField HtlcEvent "timestampNs" Word64 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "timestampNs" -> (Word64 -> f Word64) -> HtlcEvent -> f HtlcEvent

HasField HtlcInfo "incomingAmtMsat" Word64 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "incomingAmtMsat" -> (Word64 -> f Word64) -> HtlcInfo -> f HtlcInfo

HasField HtlcInfo "outgoingAmtMsat" Word64 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "outgoingAmtMsat" -> (Word64 -> f Word64) -> HtlcInfo -> f HtlcInfo

HasField MissionControlConfig "halfLifeSeconds" Word64 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "halfLifeSeconds" -> (Word64 -> f Word64) -> MissionControlConfig -> f MissionControlConfig

HasField MissionControlConfig "minimumFailureRelaxInterval" Word64 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "minimumFailureRelaxInterval" -> (Word64 -> f Word64) -> MissionControlConfig -> f MissionControlConfig

HasField SendPaymentRequest "maxShardSizeMsat" Word64 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "maxShardSizeMsat" -> (Word64 -> f Word64) -> SendPaymentRequest -> f SendPaymentRequest

HasField SendPaymentRequest "outgoingChanId" Word64 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "outgoingChanId" -> (Word64 -> f Word64) -> SendPaymentRequest -> f SendPaymentRequest

HasField SendPaymentRequest'DestCustomRecordsEntry "key" Word64 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "key" -> (Word64 -> f Word64) -> SendPaymentRequest'DestCustomRecordsEntry -> f SendPaymentRequest'DestCustomRecordsEntry

HasField BumpFeeRequest "satPerVbyte" Word64 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "satPerVbyte" -> (Word64 -> f Word64) -> BumpFeeRequest -> f BumpFeeRequest

HasField FundPsbtRequest "satPerVbyte" Word64 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "satPerVbyte" -> (Word64 -> f Word64) -> FundPsbtRequest -> f FundPsbtRequest

HasField LeaseOutputRequest "expirationSeconds" Word64 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "expirationSeconds" -> (Word64 -> f Word64) -> LeaseOutputRequest -> f LeaseOutputRequest

HasField LeaseOutputResponse "expiration" Word64 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "expiration" -> (Word64 -> f Word64) -> LeaseOutputResponse -> f LeaseOutputResponse

HasField PendingSweep "requestedSatPerVbyte" Word64 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "requestedSatPerVbyte" -> (Word64 -> f Word64) -> PendingSweep -> f PendingSweep

HasField PendingSweep "satPerVbyte" Word64 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "satPerVbyte" -> (Word64 -> f Word64) -> PendingSweep -> f PendingSweep

HasField TxTemplate'OutputsEntry "value" Word64 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "value" -> (Word64 -> f Word64) -> TxTemplate'OutputsEntry -> f TxTemplate'OutputsEntry

HasField UtxoLease "expiration" Word64 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "expiration" -> (Word64 -> f Word64) -> UtxoLease -> f UtxoLease

HasField InitWalletRequest "extendedMasterKeyBirthdayTimestamp" Word64 
Instance details

Defined in Proto.Walletunlocker

Methods

fieldOf :: Functor f => Proxy# "extendedMasterKeyBirthdayTimestamp" -> (Word64 -> f Word64) -> InitWalletRequest -> f InitWalletRequest

HasField WatchOnly "masterKeyBirthdayTimestamp" Word64 
Instance details

Defined in Proto.Walletunlocker

Methods

fieldOf :: Functor f => Proxy# "masterKeyBirthdayTimestamp" -> (Word64 -> f Word64) -> WatchOnly -> f WatchOnly

HasField ListMacaroonIDsResponse "rootKeyIds" [Word64] 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "rootKeyIds" -> ([Word64] -> f [Word64]) -> ListMacaroonIDsResponse -> f ListMacaroonIDsResponse

HasField ListMacaroonIDsResponse "vec'rootKeyIds" (Vector Word64) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "vec'rootKeyIds" -> (Vector Word64 -> f (Vector Word64)) -> ListMacaroonIDsResponse -> f ListMacaroonIDsResponse

HasField SendPaymentRequest "outgoingChanIds" [Word64] 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "outgoingChanIds" -> ([Word64] -> f [Word64]) -> SendPaymentRequest -> f SendPaymentRequest

HasField SendPaymentRequest "vec'outgoingChanIds" (Vector Word64) 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "vec'outgoingChanIds" -> (Vector Word64 -> f (Vector Word64)) -> SendPaymentRequest -> f SendPaymentRequest

HasField FundPsbtRequest "maybe'satPerVbyte" (Maybe Word64) 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "maybe'satPerVbyte" -> (Maybe Word64 -> f (Maybe Word64)) -> FundPsbtRequest -> f FundPsbtRequest

HasField SendRequest "destCustomRecords" (Map Word64 ByteString) 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "destCustomRecords" -> (Map Word64 ByteString -> f (Map Word64 ByteString)) -> SendRequest -> f SendRequest

HasField Hop "customRecords" (Map Word64 ByteString) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "customRecords" -> (Map Word64 ByteString -> f (Map Word64 ByteString)) -> Hop -> f Hop

HasField QueryRoutesRequest "destCustomRecords" (Map Word64 ByteString) 
Instance details

Defined in Proto.Lnrpc.Ln0

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.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "customRecords" -> (Map Word64 ByteString -> f (Map Word64 ByteString)) -> InvoiceHTLC -> f InvoiceHTLC

HasField ForwardHtlcInterceptRequest "customRecords" (Map Word64 ByteString) 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "customRecords" -> (Map Word64 ByteString -> f (Map Word64 ByteString)) -> ForwardHtlcInterceptRequest -> f ForwardHtlcInterceptRequest

HasField SendPaymentRequest "destCustomRecords" (Map Word64 ByteString) 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "destCustomRecords" -> (Map Word64 ByteString -> f (Map Word64 ByteString)) -> SendPaymentRequest -> f SendPaymentRequest

HasField TxTemplate "outputs" (Map Text Word64) 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "outputs" -> (Map Text Word64 -> f (Map Text Word64)) -> TxTemplate -> f TxTemplate

From FeeRate (Ratio Word64) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: FeeRate -> Ratio Word64

From Word64 (Money owner btcl mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Word64 -> Money owner btcl mrel

From (Ratio Word64) FeeRate Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Ratio Word64 -> FeeRate

From (Money owner btcl mrel) Word64 Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Money owner btcl mrel -> 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 PrimSize Word64 
Instance details

Defined in Basement.PrimType

type PrimSize Word64 = 8
newtype Vector Word64 
Instance details

Defined in Data.Vector.Unboxed.Base

type ByteSink Word64 g 
Instance details

Defined in Data.UUID.Types.Internal.Builder

type ByteSink Word64 g = Takes8Bytes g
newtype MVector s Word64 
Instance details

Defined in Data.Vector.Unboxed.Base

data 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

Instances details
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 :: forall (a :: k0). URec (Ptr ()) a -> Rep1 (URec (Ptr ())) a #

to1 :: forall (a :: k0). Rep1 (URec (Ptr ())) a -> URec (Ptr ()) a #

Foldable (UAddr :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => UAddr m -> m #

foldMap :: Monoid m => (a -> m) -> UAddr a -> m #

foldMap' :: Monoid m => (a -> m) -> UAddr a -> m #

foldr :: (a -> b -> b) -> b -> UAddr a -> b #

foldr' :: (a -> b -> b) -> b -> UAddr a -> b #

foldl :: (b -> a -> b) -> b -> UAddr a -> b #

foldl' :: (b -> a -> b) -> b -> UAddr a -> b #

foldr1 :: (a -> a -> a) -> UAddr a -> a #

foldl1 :: (a -> a -> a) -> UAddr a -> a #

toList :: UAddr a -> [a] #

null :: UAddr a -> Bool #

length :: UAddr a -> Int #

elem :: Eq a => a -> UAddr a -> Bool #

maximum :: Ord a => UAddr a -> a #

minimum :: Ord a => UAddr a -> a #

sum :: Num a => UAddr a -> a #

product :: Num a => UAddr a -> a #

Traversable (UAddr :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> UAddr a -> f (UAddr b) #

sequenceA :: Applicative f => UAddr (f a) -> f (UAddr a) #

mapM :: Monad m => (a -> m b) -> UAddr a -> m (UAddr b) #

sequence :: Monad m => UAddr (m a) -> m (UAddr a) #

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 () #

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 #

NFData (Ptr a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: 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 #

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

Methods

sizeOf# :: Ptr a -> Int# #

alignment# :: Ptr a -> Int# #

indexByteArray# :: ByteArray# -> Int# -> Ptr a #

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, Ptr a #) #

writeByteArray# :: MutableByteArray# s -> Int# -> Ptr a -> State# s -> State# s #

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> Ptr a -> State# s -> State# s #

indexOffAddr# :: Addr# -> Int# -> Ptr a #

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, Ptr a #) #

writeOffAddr# :: Addr# -> Int# -> Ptr a -> State# s -> State# s #

setOffAddr# :: Addr# -> Int# -> Int# -> Ptr a -> State# s -> State# s #

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 #

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 #

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 #

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

Instances details
NFData1 FunPtr

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> FunPtr a -> () #

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 () #

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 #

NFData (FunPtr a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: 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 #

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

Instances details
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 #

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 -> () #

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 #

(Lift a, Lift b) => Lift (Either a b :: Type) 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Either a b -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Either a b -> Code m (Either a b) #

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 #

Foldable (Either a)

Since: base-4.7.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Either a m -> m #

foldMap :: Monoid m => (a0 -> m) -> Either a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> Either a a0 -> m #

foldr :: (a0 -> b -> b) -> b -> Either a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Either a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> Either a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> Either a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Either a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> Either a a0 -> a0 #

toList :: Either a a0 -> [a0] #

null :: Either a a0 -> Bool #

length :: Either a a0 -> Int #

elem :: Eq a0 => a0 -> Either a a0 -> Bool #

maximum :: Ord a0 => Either a a0 -> a0 #

minimum :: Ord a0 => Either a a0 -> a0 #

sum :: Num a0 => Either a a0 -> a0 #

product :: Num a0 => Either a a0 -> a0 #

Eq a => Eq1 (Either a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftEq :: (a0 -> b -> Bool) -> Either a a0 -> Either a b -> Bool #

Ord a => Ord1 (Either a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftCompare :: (a0 -> b -> Ordering) -> Either a a0 -> Either a b -> Ordering #

Read a => Read1 (Either a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftReadsPrec :: (Int -> ReadS a0) -> ReadS [a0] -> Int -> ReadS (Either a a0) #

liftReadList :: (Int -> ReadS a0) -> ReadS [a0] -> ReadS [Either a a0] #

liftReadPrec :: ReadPrec a0 -> ReadPrec [a0] -> ReadPrec (Either a a0) #

liftReadListPrec :: ReadPrec a0 -> ReadPrec [a0] -> ReadPrec [Either a a0] #

Show a => Show1 (Either a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec :: (Int -> a0 -> ShowS) -> ([a0] -> ShowS) -> Int -> Either a a0 -> ShowS #

liftShowList :: (Int -> a0 -> ShowS) -> ([a0] -> ShowS) -> [Either a a0] -> ShowS #

Traversable (Either a)

Since: base-4.7.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a0 -> f b) -> Either a a0 -> f (Either a b) #

sequenceA :: Applicative f => Either a (f a0) -> f (Either a a0) #

mapM :: Monad m => (a0 -> m b) -> Either a a0 -> m (Either a b) #

sequence :: Monad m => Either a (m a0) -> m (Either a a0) #

Applicative (Either e)

Since: base-3.0

Instance details

Defined in Data.Either

Methods

pure :: a -> Either e a #

(<*>) :: Either e (a -> b) -> Either e a -> Either e b #

liftA2 :: (a -> b -> c) -> Either e a -> Either e b -> Either e c #

(*>) :: Either e a -> Either e b -> Either e b #

(<*) :: Either e a -> Either e b -> Either e a #

Functor (Either a)

Since: base-3.0

Instance details

Defined in Data.Either

Methods

fmap :: (a0 -> b) -> Either a a0 -> Either a b #

(<$) :: a0 -> Either a b -> Either a a0 #

Monad (Either e)

Since: base-4.4.0.0

Instance details

Defined in Data.Either

Methods

(>>=) :: Either e a -> (a -> Either e b) -> Either e b #

(>>) :: Either e a -> Either e b -> Either e b #

return :: a -> Either e a #

MonadFailure (Either a) 
Instance details

Defined in Basement.Monad

Associated Types

type Failure (Either a) #

Methods

mFail :: Failure (Either a) -> Either a () #

NFData a => NFData1 (Either a)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a0 -> ()) -> Either a a0 -> () #

e ~ SomeException => MonadCatch (Either e)

Since: exceptions-0.8.3

Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e0 => Either e a -> (e0 -> Either e a) -> Either e a #

e ~ SomeException => MonadMask (Either e)

Since: exceptions-0.8.3

Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. Either e a -> Either e a) -> Either e b) -> Either e b #

uninterruptibleMask :: ((forall a. Either e a -> Either e a) -> Either e b) -> Either e b #

generalBracket :: Either e a -> (a -> ExitCase b -> Either e c) -> (a -> Either e b) -> Either e (b, c) #

e ~ SomeException => MonadThrow (Either e) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e0 => e0 -> Either e a #

Hashable a => Hashable1 (Either a) 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a0 -> Int) -> Int -> Either a a0 -> Int #

Apply (Either a) 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(<.>) :: Either a (a0 -> b) -> Either a a0 -> Either a b #

(.>) :: Either a a0 -> Either a b -> Either a b #

(<.) :: Either a a0 -> Either a b -> Either a a0 #

liftF2 :: (a0 -> b -> c) -> Either a a0 -> Either a b -> Either a c #

Bind (Either a) 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(>>-) :: Either a a0 -> (a0 -> Either a b) -> Either a b #

join :: Either a (Either a a0) -> Either a a0 #

Generic1 (Either a :: Type -> Type) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 (Either a) :: k -> Type #

Methods

from1 :: forall (a0 :: k). Either a a0 -> Rep1 (Either a) a0 #

to1 :: forall (a0 :: k). Rep1 (Either a) a0 -> Either a a0 #

MonadBaseControl (Either e) (Either e) 
Instance details

Defined in Control.Monad.Trans.Control

Associated Types

type StM (Either e) a #

Methods

liftBaseWith :: (RunInBase (Either e) (Either e) -> Either e a) -> Either e a #

restoreM :: StM (Either e) a -> Either e a #

(Out a, Out b) => Out (Either a b) 
Instance details

Defined in Text.PrettyPrint.GenericPretty

Methods

docPrec :: Int -> Either a b -> Doc #

doc :: Either a b -> Doc #

docList :: [Either a b] -> Doc #

(FromJSON a, FromJSON b) => FromJSON (Either a b) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Either a b) #

parseJSONList :: Value -> Parser [Either a b] #

(ToJSON a, ToJSON b) => ToJSON (Either a b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Either a b -> Value #

toEncoding :: Either a b -> Encoding #

toJSONList :: [Either a b] -> Value #

toEncodingList :: [Either a b] -> Encoding #

Semigroup (Either a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Either

Methods

(<>) :: Either a b -> Either a b -> Either a b #

sconcat :: NonEmpty (Either a b) -> Either a b #

stimes :: Integral b0 => b0 -> Either a b -> Either a b #

Generic (Either a b) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Either a b) :: Type -> Type #

Methods

from :: Either a b -> Rep (Either a b) x #

to :: Rep (Either a b) x -> Either a b #

(Read a, Read b) => Read (Either a b)

Since: base-3.0

Instance details

Defined in Data.Either

(Show a, Show b) => Show (Either a b)

Since: base-3.0

Instance details

Defined in Data.Either

Methods

showsPrec :: Int -> Either a b -> ShowS #

show :: Either a b -> String #

showList :: [Either a b] -> ShowS #

(NFData a, NFData b) => NFData (Either a b) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Either a b -> () #

(Eq a, Eq b) => Eq (Either a b)

Since: base-2.1

Instance details

Defined in Data.Either

Methods

(==) :: Either a b -> Either a b -> Bool #

(/=) :: Either a b -> Either a b -> Bool #

(Ord a, Ord b) => Ord (Either a b)

Since: base-2.1

Instance details

Defined in Data.Either

Methods

compare :: Either a b -> Either a b -> Ordering #

(<) :: Either a b -> Either a b -> Bool #

(<=) :: Either a b -> Either a b -> Bool #

(>) :: Either a b -> Either a b -> Bool #

(>=) :: Either a b -> Either a b -> Bool #

max :: Either a b -> Either a b -> Either a b #

min :: Either a b -> Either a b -> Either a b #

(Hashable a, Hashable b) => Hashable (Either a b) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Either a b -> Int #

hash :: Either a b -> Int #

(FromHttpApiData a, FromHttpApiData b) => FromHttpApiData (Either a b)
>>> parseUrlPiece "Right 123" :: Either Text (Either String Int)
Right (Right 123)
Instance details

Defined in Web.Internal.HttpApiData

(ToHttpApiData a, ToHttpApiData b) => ToHttpApiData (Either a b)
>>> toUrlPiece (Left "err" :: Either String Int)
"left err"
>>> toUrlPiece (Right 3 :: Either String Int)
"right 3"
Instance details

Defined in Web.Internal.HttpApiData

MonoFoldable (Either a b) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (Either a b) -> m) -> Either a b -> m #

ofoldr :: (Element (Either a b) -> b0 -> b0) -> b0 -> Either a b -> b0 #

ofoldl' :: (a0 -> Element (Either a b) -> a0) -> a0 -> Either a b -> a0 #

otoList :: Either a b -> [Element (Either a b)] #

oall :: (Element (Either a b) -> Bool) -> Either a b -> Bool #

oany :: (Element (Either a b) -> Bool) -> Either a b -> Bool #

onull :: Either a b -> Bool #

olength :: Either a b -> Int #

olength64 :: Either a b -> Int64 #

ocompareLength :: Integral i => Either a b -> i -> Ordering #

otraverse_ :: Applicative f => (Element (Either a b) -> f b0) -> Either a b -> f () #

ofor_ :: Applicative f => Either a b -> (Element (Either a b) -> f b0) -> f () #

omapM_ :: Applicative m => (Element (Either a b) -> m ()) -> Either a b -> m () #

oforM_ :: Applicative m => Either a b -> (Element (Either a b) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (Either a b) -> m a0) -> a0 -> Either a b -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (Either a b) -> m) -> Either a b -> m #

ofoldr1Ex :: (Element (Either a b) -> Element (Either a b) -> Element (Either a b)) -> Either a b -> Element (Either a b) #

ofoldl1Ex' :: (Element (Either a b) -> Element (Either a b) -> Element (Either a b)) -> Either a b -> Element (Either a b) #

headEx :: Either a b -> Element (Either a b) #

lastEx :: Either a b -> Element (Either a b) #

unsafeHead :: Either a b -> Element (Either a b) #

unsafeLast :: Either a b -> Element (Either a b) #

maximumByEx :: (Element (Either a b) -> Element (Either a b) -> Ordering) -> Either a b -> Element (Either a b) #

minimumByEx :: (Element (Either a b) -> Element (Either a b) -> Ordering) -> Either a b -> Element (Either a b) #

oelem :: Element (Either a b) -> Either a b -> Bool #

onotElem :: Element (Either a b) -> Either a b -> Bool #

MonoFunctor (Either a b) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Either a b) -> Element (Either a b)) -> Either a b -> Either a b #

MonoPointed (Either a b) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Either a b) -> Either a b #

MonoTraversable (Either a b) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (Either a b) -> f (Element (Either a b))) -> Either a b -> f (Either a b) #

omapM :: Applicative m => (Element (Either a b) -> m (Element (Either a b))) -> Either a b -> m (Either a b) #

(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) #

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) #

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 #

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 #

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)) #

safeMaximum :: Either a b -> Maybe (Element (Either a b)) #

safeMinimum :: Either a b -> Maybe (Element (Either a b)) #

safeFoldr1 :: (Element (Either a b) -> Element (Either a b) -> Element (Either a b)) -> Either a b -> Maybe (Element (Either a b)) #

safeFoldl1 :: (Element (Either a b) -> Element (Either a b) -> Element (Either a b)) -> Either a b -> Maybe (Element (Either a b)) #

(a ~ a', b ~ b') => Each (Either a a') (Either b b') a b

Since: microlens-0.4.11

Instance details

Defined in Lens.Micro.Internal

Methods

each :: Traversal (Either a a') (Either b b') a b #

type 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 Element (Either a b) 
Instance details

Defined in Data.MonoTraversable

type Element (Either a b) = b
type PersistConfigBackend (Either c1 c2) 
Instance details

Defined in Database.Persist.Class.PersistConfig

type PersistConfigPool (Either c1 c2) 
Instance details

Defined in Database.Persist.Class.PersistConfig

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 lifted 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.

Instances

Instances details
KnownNat n => HasResolution (n :: Nat)

For example, Fixed 1000 will give you a Fixed with a resolution of 1000.

Instance details

Defined in Data.Fixed

Methods

resolution :: p n -> Integer #

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 :: k) (b :: k) #

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

Instances details
IsList CallStack

Be aware that 'fromList . toList = id' only for unfrozen CallStacks, since toList removes frozenness information.

Since: base-4.9.0.0

Instance details

Defined in GHC.Exts

Associated Types

type Item CallStack #

Show CallStack

Since: base-4.9.0.0

Instance details

Defined in GHC.Show

NFData CallStack

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CallStack -> () #

type Item CallStack 
Instance details

Defined in GHC.Exts

class Out a where #

The class Out is the equivalent of Show

It provides conversion of values to pretty printable Pretty.Doc's.

Minimal complete definition: docPrec or doc.

Derived instances of Out have the following properties

  • The result of docPrec 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 docPrec 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 docPrec will produce the record-syntax form, with the fields given in the same order as the original declaration.

For example, given the declarations

data Tree a =  Leaf a  |  Node (Tree a) (Tree a) deriving (Generic)

The derived instance of Out is equivalent to:

instance (Out a) => Out (Tree a) where
 
        docPrec d (Leaf m) = Pretty.sep $ wrapParens (d > appPrec) $
             text "Leaf" : [nest (constrLen + parenLen) (docPrec (appPrec+1) m)]
          where appPrec = 10
                constrLen = 5;
                parenLen = if(d > appPrec) then 1 else 0

        docPrec d (Node u v) = Pretty.sep $ wrapParens (d > appPrec) $
             text "Node" : 
             nest (constrLen + parenLen) (docPrec (appPrec+1) u) : 
             [nest (constrLen + parenLen) (docPrec (appPrec+1) v)]
          where appPrec = 10
                constrLen = 5
                parenLen = if(d > appPrec) then 1 else 0

Minimal complete definition

Nothing

Methods

docPrec #

Arguments

:: Int

the operator precedence of the enclosing context (a number from 0 to 11). Function application has precedence 10.

-> a

the value to be converted to a String

-> Doc

the resulting Doc

docPrec is the equivalent of showsPrec.

Convert a value to a pretty printable Doc.

doc :: a -> Doc #

doc is the equivalent of show

This is a specialised variant of docPrec, using precedence context zero.

docList :: [a] -> Doc #

docList is the equivalent of showList.

The method docList is provided to allow the programmer to give a specialised way of showing lists of values. For example, this is used by the predefined Out instance of the Char type, where values of type String should be shown in double quotes, rather than between square brackets.

Instances

Instances details
Out SomeException Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Out Rational 
Instance details

Defined in Text.PrettyPrint.GenericPretty

Methods

docPrec :: Int -> Rational -> Doc #

doc :: Rational -> Doc #

docList :: [Rational] -> Doc #

Out BlkHash Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

docPrec :: Int -> BlkHash -> Doc #

doc :: BlkHash -> Doc #

docList :: [BlkHash] -> Doc #

Out BlkHeight Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

docPrec :: Int -> BlkHeight -> Doc #

doc :: BlkHeight -> Doc #

docList :: [BlkHeight] -> Doc #

Out BlkStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

docPrec :: Int -> BlkStatus -> Doc #

doc :: BlkStatus -> Doc #

docList :: [BlkStatus] -> Doc #

Out Failure Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

docPrec :: Int -> Failure -> Doc #

doc :: Failure -> Doc #

docList :: [Failure] -> Doc #

Out FailureInput Source # 
Instance details

Defined in BtcLsp.Data.Type

Out FailureInternal Source # 
Instance details

Defined in BtcLsp.Data.Type

Out LnChanStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Out LnInvoiceStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Out MicroSeconds Source # 
Instance details

Defined in BtcLsp.Data.Type

Out NodePubKeyHex Source # 
Instance details

Defined in BtcLsp.Data.Type

Out NodeUri Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

docPrec :: Int -> NodeUri -> Doc #

doc :: NodeUri -> Doc #

docList :: [NodeUri] -> Doc #

Out NodeUriHex Source # 
Instance details

Defined in BtcLsp.Data.Type

Out Nonce Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

docPrec :: Int -> Nonce -> Doc #

doc :: Nonce -> Doc #

docList :: [Nonce] -> Doc #

Out Privacy Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

docPrec :: Int -> Privacy -> Doc #

doc :: Privacy -> Doc #

docList :: [Privacy] -> Doc #

Out PsbtUtxo Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

docPrec :: Int -> PsbtUtxo -> Doc #

doc :: PsbtUtxo -> Doc #

docList :: [PsbtUtxo] -> Doc #

Out RHashHex Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

docPrec :: Int -> RHashHex -> Doc #

doc :: RHashHex -> Doc #

docList :: [RHashHex] -> Doc #

Out RowQty Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

docPrec :: Int -> RowQty -> Doc #

doc :: RowQty -> Doc #

docList :: [RowQty] -> Doc #

Out Seconds Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

docPrec :: Int -> Seconds -> Doc #

doc :: Seconds -> Doc #

docList :: [Seconds] -> Doc #

Out SocketAddress Source # 
Instance details

Defined in BtcLsp.Data.Type

Out SwapHash Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

docPrec :: Int -> SwapHash -> Doc #

doc :: SwapHash -> Doc #

docList :: [SwapHash] -> Doc #

Out SwapStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Out SwapUtxoStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Out UtxoLockId Source # 
Instance details

Defined in BtcLsp.Data.Type

Out Vbyte Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

docPrec :: Int -> Vbyte -> Doc #

doc :: Vbyte -> Doc #

docList :: [Vbyte] -> Doc #

Out Encryption Source # 
Instance details

Defined in BtcLsp.Grpc.Data

Out RawRequestBytes Source # 
Instance details

Defined in BtcLsp.Grpc.Data

Out LndSig Source # 
Instance details

Defined in BtcLsp.Grpc.Sig

Methods

docPrec :: Int -> LndSig -> Doc #

doc :: LndSig -> Doc #

docList :: [LndSig] -> Doc #

Out MsgToSign Source # 
Instance details

Defined in BtcLsp.Grpc.Sig

Methods

docPrec :: Int -> MsgToSign -> Doc #

doc :: MsgToSign -> Doc #

docList :: [MsgToSign] -> Doc #

Out InQty Source # 
Instance details

Defined in BtcLsp.Math.OnChain

Methods

docPrec :: Int -> InQty -> Doc #

doc :: InQty -> Doc #

docList :: [InQty] -> Doc #

Out OutQty Source # 
Instance details

Defined in BtcLsp.Math.OnChain

Methods

docPrec :: Int -> OutQty -> Doc #

doc :: OutQty -> Doc #

docList :: [OutQty] -> Doc #

Out SatPerVbyte Source # 
Instance details

Defined in BtcLsp.Math.OnChain

Out SwapCap Source # 
Instance details

Defined in BtcLsp.Math.Swap

Methods

docPrec :: Int -> SwapCap -> Doc #

doc :: SwapCap -> Doc #

docList :: [SwapCap] -> Doc #

Out OpenUpdateEvt Source # 
Instance details

Defined in BtcLsp.Psbt.PsbtOpener

Out Block Source # 
Instance details

Defined in BtcLsp.Storage.Model

Methods

docPrec :: Int -> Block -> Doc #

doc :: Block -> Doc #

docList :: [Block] -> Doc #

Out LnChan Source # 
Instance details

Defined in BtcLsp.Storage.Model

Methods

docPrec :: Int -> LnChan -> Doc #

doc :: LnChan -> Doc #

docList :: [LnChan] -> Doc #

Out SwapIntoLn Source # 
Instance details

Defined in BtcLsp.Storage.Model

Out SwapUtxo Source # 
Instance details

Defined in BtcLsp.Storage.Model

Methods

docPrec :: Int -> SwapUtxo -> Doc #

doc :: SwapUtxo -> Doc #

docList :: [SwapUtxo] -> Doc #

Out User Source # 
Instance details

Defined in BtcLsp.Storage.Model

Methods

docPrec :: Int -> User -> Doc #

doc :: User -> Doc #

docList :: [User] -> Doc #

Out HtmlClassAttr Source # 
Instance details

Defined in BtcLsp.Yesod.Data.Widget

Out Layout Source # 
Instance details

Defined in BtcLsp.Yesod.Data.Widget

Methods

docPrec :: Int -> Layout -> Doc #

doc :: Layout -> Doc #

docList :: [Layout] -> Doc #

Out Ctx Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

docPrec :: Int -> Ctx -> Doc #

doc :: Ctx -> Doc #

docList :: [Ctx] -> Doc #

Out FeeMoney Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

docPrec :: Int -> FeeMoney -> Doc #

doc :: FeeMoney -> Doc #

docList :: [FeeMoney] -> Doc #

Out FeeRate Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

docPrec :: Int -> FeeRate -> Doc #

doc :: FeeRate -> Doc #

docList :: [FeeRate] -> Doc #

Out FieldIndex Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Out FundLnHodlInvoice Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Out FundLnInvoice Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Out FundMoney Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

docPrec :: Int -> FundMoney -> Doc #

doc :: FundMoney -> Doc #

docList :: [FundMoney] -> Doc #

Out FundOnChainAddress Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Out InputFailure Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Out InputFailureKind Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Out InputFailureKind'UnrecognizedValue Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Out InternalFailure Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Out InternalFailure'Either Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Out LnHost Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

docPrec :: Int -> LnHost -> Doc #

doc :: LnHost -> Doc #

docList :: [LnHost] -> Doc #

Out LnPeer Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

docPrec :: Int -> LnPeer -> Doc #

doc :: LnPeer -> Doc #

docList :: [LnPeer] -> Doc #

Out LnPort Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

docPrec :: Int -> LnPort -> Doc #

doc :: LnPort -> Doc #

docList :: [LnPort] -> Doc #

Out LnPubKey Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

docPrec :: Int -> LnPubKey -> Doc #

doc :: LnPubKey -> Doc #

docList :: [LnPubKey] -> Doc #

Out LocalBalance Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Out Nonce Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

docPrec :: Int -> Nonce -> Doc #

doc :: Nonce -> Doc #

docList :: [Nonce] -> Doc #

Out Privacy Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

docPrec :: Int -> Privacy -> Doc #

doc :: Privacy -> Doc #

docList :: [Privacy] -> Doc #

Out Privacy'UnrecognizedValue Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Out RefundMoney Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Out RefundOnChainAddress Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Out RemoteBalance Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Out LnHodlInvoice Source # 
Instance details

Defined in Proto.BtcLsp.Data.LowLevel

Out LnInvoice Source # 
Instance details

Defined in Proto.BtcLsp.Data.LowLevel

Methods

docPrec :: Int -> LnInvoice -> Doc #

doc :: LnInvoice -> Doc #

docList :: [LnInvoice] -> Doc #

Out Msat Source # 
Instance details

Defined in Proto.BtcLsp.Data.LowLevel

Methods

docPrec :: Int -> Msat -> Doc #

doc :: Msat -> Doc #

docList :: [Msat] -> Doc #

Out OnChainAddress Source # 
Instance details

Defined in Proto.BtcLsp.Data.LowLevel

Out Urational Source # 
Instance details

Defined in Proto.BtcLsp.Data.LowLevel

Methods

docPrec :: Int -> Urational -> Doc #

doc :: Urational -> Doc #

docList :: [Urational] -> Doc #

Out Request Source # 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Methods

docPrec :: Int -> Request -> Doc #

doc :: Request -> Doc #

docList :: [Request] -> Doc #

Out Response Source # 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Methods

docPrec :: Int -> Response -> Doc #

doc :: Response -> Doc #

docList :: [Response] -> Doc #

Out Response'Either Source # 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Out Response'Failure Source # 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Out Response'Failure'InputFailure Source # 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Out Response'Failure'InputFailure'UnrecognizedValue Source # 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Out Response'Success Source # 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Out Request Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Methods

docPrec :: Int -> Request -> Doc #

doc :: Request -> Doc #

docList :: [Request] -> Doc #

Out Response Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Methods

docPrec :: Int -> Response -> Doc #

doc :: Response -> Doc #

docList :: [Response] -> Doc #

Out Response'Either Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Out Response'Failure Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Out Response'Failure'InputFailure Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Out Response'Failure'InputFailure'UnrecognizedValue Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Out Response'Success Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Out Request Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Methods

docPrec :: Int -> Request -> Doc #

doc :: Request -> Doc #

docList :: [Request] -> Doc #

Out Response Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Methods

docPrec :: Int -> Response -> Doc #

doc :: Response -> Doc #

docList :: [Response] -> Doc #

Out Response'Either Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Out Response'Failure Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Out Response'Failure'InputFailure Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Out Response'Failure'InputFailure'UnrecognizedValue Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Out Response'Success Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Out ByteStringDoc 
Instance details

Defined in Text.PrettyPrint.GenericPretty.Instance

Methods

docPrec :: Int -> ByteStringDoc -> Doc #

doc :: ByteStringDoc -> Doc #

docList :: [ByteStringDoc] -> Doc #

Out SecretVision 
Instance details

Defined in Text.PrettyPrint.GenericPretty.Type

Out AddHodlInvoiceRequest 
Instance details

Defined in LndClient.Data.AddHodlInvoice

Methods

docPrec :: Int -> AddHodlInvoiceRequest -> Doc #

doc :: AddHodlInvoiceRequest -> Doc #

docList :: [AddHodlInvoiceRequest] -> Doc #

Out AddInvoiceRequest 
Instance details

Defined in LndClient.Data.AddInvoice

Methods

docPrec :: Int -> AddInvoiceRequest -> Doc #

doc :: AddInvoiceRequest -> Doc #

docList :: [AddInvoiceRequest] -> Doc #

Out AddInvoiceResponse 
Instance details

Defined in LndClient.Data.AddInvoice

Methods

docPrec :: Int -> AddInvoiceResponse -> Doc #

doc :: AddInvoiceResponse -> Doc #

docList :: [AddInvoiceResponse] -> Doc #

Out Channel 
Instance details

Defined in LndClient.Data.Channel

Methods

docPrec :: Int -> Channel -> Doc #

doc :: Channel -> Doc #

docList :: [Channel] -> Doc #

Out ChannelBackup 
Instance details

Defined in LndClient.Data.ChannelBackup

Methods

docPrec :: Int -> ChannelBackup -> Doc #

doc :: ChannelBackup -> Doc #

docList :: [ChannelBackup] -> Doc #

Out SingleChanBackupBlob 
Instance details

Defined in LndClient.Data.ChannelBackup

Methods

docPrec :: Int -> SingleChanBackupBlob -> Doc #

doc :: SingleChanBackupBlob -> Doc #

docList :: [SingleChanBackupBlob] -> Doc #

Out ChannelPoint 
Instance details

Defined in LndClient.Data.ChannelPoint

Methods

docPrec :: Int -> ChannelPoint -> Doc #

doc :: ChannelPoint -> Doc #

docList :: [ChannelPoint] -> Doc #

Out ChannelCloseSummary 
Instance details

Defined in LndClient.Data.CloseChannel

Methods

docPrec :: Int -> ChannelCloseSummary -> Doc #

doc :: ChannelCloseSummary -> Doc #

docList :: [ChannelCloseSummary] -> Doc #

Out ChannelCloseUpdate 
Instance details

Defined in LndClient.Data.CloseChannel

Methods

docPrec :: Int -> ChannelCloseUpdate -> Doc #

doc :: ChannelCloseUpdate -> Doc #

docList :: [ChannelCloseUpdate] -> Doc #

Out CloseChannelRequest 
Instance details

Defined in LndClient.Data.CloseChannel

Methods

docPrec :: Int -> CloseChannelRequest -> Doc #

doc :: CloseChannelRequest -> Doc #

docList :: [CloseChannelRequest] -> Doc #

Out CloseStatusUpdate 
Instance details

Defined in LndClient.Data.CloseChannel

Methods

docPrec :: Int -> CloseStatusUpdate -> Doc #

doc :: CloseStatusUpdate -> Doc #

docList :: [CloseStatusUpdate] -> Doc #

Out ClosedChannel 
Instance details

Defined in LndClient.Data.ClosedChannel

Methods

docPrec :: Int -> ClosedChannel -> Doc #

doc :: ClosedChannel -> Doc #

docList :: [ClosedChannel] -> Doc #

Out ClosedChannelsRequest 
Instance details

Defined in LndClient.Data.ClosedChannels

Methods

docPrec :: Int -> ClosedChannelsRequest -> Doc #

doc :: ClosedChannelsRequest -> Doc #

docList :: [ClosedChannelsRequest] -> Doc #

Out FinalizePsbtRequest 
Instance details

Defined in LndClient.Data.FinalizePsbt

Methods

docPrec :: Int -> FinalizePsbtRequest -> Doc #

doc :: FinalizePsbtRequest -> Doc #

docList :: [FinalizePsbtRequest] -> Doc #

Out FinalizePsbtResponse 
Instance details

Defined in LndClient.Data.FinalizePsbt

Methods

docPrec :: Int -> FinalizePsbtResponse -> Doc #

doc :: FinalizePsbtResponse -> Doc #

docList :: [FinalizePsbtResponse] -> Doc #

Out ForceClosedChannel 
Instance details

Defined in LndClient.Data.ForceClosedChannel

Methods

docPrec :: Int -> ForceClosedChannel -> Doc #

doc :: ForceClosedChannel -> Doc #

docList :: [ForceClosedChannel] -> Doc #

Out Fee 
Instance details

Defined in LndClient.Data.FundPsbt

Methods

docPrec :: Int -> Fee -> Doc #

doc :: Fee -> Doc #

docList :: [Fee] -> Doc #

Out FundPsbtRequest 
Instance details

Defined in LndClient.Data.FundPsbt

Methods

docPrec :: Int -> FundPsbtRequest -> Doc #

doc :: FundPsbtRequest -> Doc #

docList :: [FundPsbtRequest] -> Doc #

Out FundPsbtResponse 
Instance details

Defined in LndClient.Data.FundPsbt

Methods

docPrec :: Int -> FundPsbtResponse -> Doc #

doc :: FundPsbtResponse -> Doc #

docList :: [FundPsbtResponse] -> Doc #

Out TxTemplate 
Instance details

Defined in LndClient.Data.FundPsbt

Methods

docPrec :: Int -> TxTemplate -> Doc #

doc :: TxTemplate -> Doc #

docList :: [TxTemplate] -> Doc #

Out UtxoLease 
Instance details

Defined in LndClient.Data.FundPsbt

Methods

docPrec :: Int -> UtxoLease -> Doc #

doc :: UtxoLease -> Doc #

docList :: [UtxoLease] -> Doc #

Out FundingPsbtFinalize 
Instance details

Defined in LndClient.Data.FundingPsbtFinalize

Methods

docPrec :: Int -> FundingPsbtFinalize -> Doc #

doc :: FundingPsbtFinalize -> Doc #

docList :: [FundingPsbtFinalize] -> Doc #

Out FundingPsbtVerify 
Instance details

Defined in LndClient.Data.FundingPsbtVerify

Methods

docPrec :: Int -> FundingPsbtVerify -> Doc #

doc :: FundingPsbtVerify -> Doc #

docList :: [FundingPsbtVerify] -> Doc #

Out ChanPointShim 
Instance details

Defined in LndClient.Data.FundingShim

Methods

docPrec :: Int -> ChanPointShim -> Doc #

doc :: ChanPointShim -> Doc #

docList :: [ChanPointShim] -> Doc #

Out FundingShim 
Instance details

Defined in LndClient.Data.FundingShim

Methods

docPrec :: Int -> FundingShim -> Doc #

doc :: FundingShim -> Doc #

docList :: [FundingShim] -> Doc #

Out KeyDescriptor 
Instance details

Defined in LndClient.Data.FundingShim

Methods

docPrec :: Int -> KeyDescriptor -> Doc #

doc :: KeyDescriptor -> Doc #

docList :: [KeyDescriptor] -> Doc #

Out FundingShimCancel 
Instance details

Defined in LndClient.Data.FundingShimCancel

Methods

docPrec :: Int -> FundingShimCancel -> Doc #

doc :: FundingShimCancel -> Doc #

docList :: [FundingShimCancel] -> Doc #

Out FundingStateStepRequest 
Instance details

Defined in LndClient.Data.FundingStateStep

Methods

docPrec :: Int -> FundingStateStepRequest -> Doc #

doc :: FundingStateStepRequest -> Doc #

docList :: [FundingStateStepRequest] -> Doc #

Out GetInfoResponse 
Instance details

Defined in LndClient.Data.GetInfo

Methods

docPrec :: Int -> GetInfoResponse -> Doc #

doc :: GetInfoResponse -> Doc #

docList :: [GetInfoResponse] -> Doc #

Out EventType 
Instance details

Defined in LndClient.Data.HtlcEvent

Methods

docPrec :: Int -> EventType -> Doc #

doc :: EventType -> Doc #

docList :: [EventType] -> Doc #

Out HtlcEvent 
Instance details

Defined in LndClient.Data.HtlcEvent

Methods

docPrec :: Int -> HtlcEvent -> Doc #

doc :: HtlcEvent -> Doc #

docList :: [HtlcEvent] -> Doc #

Out Invoice 
Instance details

Defined in LndClient.Data.Invoice

Methods

docPrec :: Int -> Invoice -> Doc #

doc :: Invoice -> Doc #

docList :: [Invoice] -> Doc #

Out InvoiceState 
Instance details

Defined in LndClient.Data.Invoice

Methods

docPrec :: Int -> InvoiceState -> Doc #

doc :: InvoiceState -> Doc #

docList :: [InvoiceState] -> Doc #

Out LeaseOutputRequest 
Instance details

Defined in LndClient.Data.LeaseOutput

Methods

docPrec :: Int -> LeaseOutputRequest -> Doc #

doc :: LeaseOutputRequest -> Doc #

docList :: [LeaseOutputRequest] -> Doc #

Out LeaseOutputResponse 
Instance details

Defined in LndClient.Data.LeaseOutput

Methods

docPrec :: Int -> LeaseOutputResponse -> Doc #

doc :: LeaseOutputResponse -> Doc #

docList :: [LeaseOutputResponse] -> Doc #

Out ListChannelsRequest 
Instance details

Defined in LndClient.Data.ListChannels

Methods

docPrec :: Int -> ListChannelsRequest -> Doc #

doc :: ListChannelsRequest -> Doc #

docList :: [ListChannelsRequest] -> Doc #

Out ListInvoiceRequest 
Instance details

Defined in LndClient.Data.ListInvoices

Methods

docPrec :: Int -> ListInvoiceRequest -> Doc #

doc :: ListInvoiceRequest -> Doc #

docList :: [ListInvoiceRequest] -> Doc #

Out ListInvoiceResponse 
Instance details

Defined in LndClient.Data.ListInvoices

Methods

docPrec :: Int -> ListInvoiceResponse -> Doc #

doc :: ListInvoiceResponse -> Doc #

docList :: [ListInvoiceResponse] -> Doc #

Out ListLeasesRequest 
Instance details

Defined in LndClient.Data.ListLeases

Methods

docPrec :: Int -> ListLeasesRequest -> Doc #

doc :: ListLeasesRequest -> Doc #

docList :: [ListLeasesRequest] -> Doc #

Out ListLeasesResponse 
Instance details

Defined in LndClient.Data.ListLeases

Methods

docPrec :: Int -> ListLeasesResponse -> Doc #

doc :: ListLeasesResponse -> Doc #

docList :: [ListLeasesResponse] -> Doc #

Out UtxoLease 
Instance details

Defined in LndClient.Data.ListLeases

Methods

docPrec :: Int -> UtxoLease -> Doc #

doc :: UtxoLease -> Doc #

docList :: [UtxoLease] -> Doc #

Out ListUnspentRequest 
Instance details

Defined in LndClient.Data.ListUnspent

Methods

docPrec :: Int -> ListUnspentRequest -> Doc #

doc :: ListUnspentRequest -> Doc #

docList :: [ListUnspentRequest] -> Doc #

Out ListUnspentResponse 
Instance details

Defined in LndClient.Data.ListUnspent

Methods

docPrec :: Int -> ListUnspentResponse -> Doc #

doc :: ListUnspentResponse -> Doc #

docList :: [ListUnspentResponse] -> Doc #

Out Utxo 
Instance details

Defined in LndClient.Data.ListUnspent

Methods

docPrec :: Int -> Utxo -> Doc #

doc :: Utxo -> Doc #

docList :: [Utxo] -> Doc #

Out LndHost' 
Instance details

Defined in LndClient.Data.LndEnv

Methods

docPrec :: Int -> LndHost' -> Doc #

doc :: LndHost' -> Doc #

docList :: [LndHost'] -> Doc #

Out LndPort' 
Instance details

Defined in LndClient.Data.LndEnv

Methods

docPrec :: Int -> LndPort' -> Doc #

doc :: LndPort' -> Doc #

docList :: [LndPort'] -> Doc #

Out AddressType 
Instance details

Defined in LndClient.Data.NewAddress

Methods

docPrec :: Int -> AddressType -> Doc #

doc :: AddressType -> Doc #

docList :: [AddressType] -> Doc #

Out NewAddressRequest 
Instance details

Defined in LndClient.Data.NewAddress

Methods

docPrec :: Int -> NewAddressRequest -> Doc #

doc :: NewAddressRequest -> Doc #

docList :: [NewAddressRequest] -> Doc #

Out NewAddressResponse 
Instance details

Defined in LndClient.Data.NewAddress

Methods

docPrec :: Int -> NewAddressResponse -> Doc #

doc :: NewAddressResponse -> Doc #

docList :: [NewAddressResponse] -> Doc #

Out AddIndex 
Instance details

Defined in LndClient.Data.Newtype

Methods

docPrec :: Int -> AddIndex -> Doc #

doc :: AddIndex -> Doc #

docList :: [AddIndex] -> Doc #

Out ChanId 
Instance details

Defined in LndClient.Data.Newtype

Methods

docPrec :: Int -> ChanId -> Doc #

doc :: ChanId -> Doc #

docList :: [ChanId] -> Doc #

Out MSat 
Instance details

Defined in LndClient.Data.Newtype

Methods

docPrec :: Int -> MSat -> Doc #

doc :: MSat -> Doc #

docList :: [MSat] -> Doc #

Out NodeLocation 
Instance details

Defined in LndClient.Data.Newtype

Methods

docPrec :: Int -> NodeLocation -> Doc #

doc :: NodeLocation -> Doc #

docList :: [NodeLocation] -> Doc #

Out NodePubKey 
Instance details

Defined in LndClient.Data.Newtype

Out PaymentRequest 
Instance details

Defined in LndClient.Data.Newtype

Methods

docPrec :: Int -> PaymentRequest -> Doc #

doc :: PaymentRequest -> Doc #

docList :: [PaymentRequest] -> Doc #

Out PendingChannelId 
Instance details

Defined in LndClient.Data.Newtype

Methods

docPrec :: Int -> PendingChannelId -> Doc #

doc :: PendingChannelId -> Doc #

docList :: [PendingChannelId] -> Doc #

Out Psbt 
Instance details

Defined in LndClient.Data.Newtype

Methods

docPrec :: Int -> Psbt -> Doc #

doc :: Psbt -> Doc #

docList :: [Psbt] -> Doc #

Out RHash 
Instance details

Defined in LndClient.Data.Newtype

Methods

docPrec :: Int -> RHash -> Doc #

doc :: RHash -> Doc #

docList :: [RHash] -> Doc #

Out RPreimage 
Instance details

Defined in LndClient.Data.Newtype

Methods

docPrec :: Int -> RPreimage -> Doc #

doc :: RPreimage -> Doc #

docList :: [RPreimage] -> Doc #

Out RawTx 
Instance details

Defined in LndClient.Data.Newtype

Methods

docPrec :: Int -> RawTx -> Doc #

doc :: RawTx -> Doc #

docList :: [RawTx] -> Doc #

Out Seconds 
Instance details

Defined in LndClient.Data.Newtype

Methods

docPrec :: Int -> Seconds -> Doc #

doc :: Seconds -> Doc #

docList :: [Seconds] -> Doc #

Out SettleIndex 
Instance details

Defined in LndClient.Data.Newtype

Methods

docPrec :: Int -> SettleIndex -> Doc #

doc :: SettleIndex -> Doc #

docList :: [SettleIndex] -> Doc #

Out ChannelOpenUpdate 
Instance details

Defined in LndClient.Data.OpenChannel

Methods

docPrec :: Int -> ChannelOpenUpdate -> Doc #

doc :: ChannelOpenUpdate -> Doc #

docList :: [ChannelOpenUpdate] -> Doc #

Out OpenChannelRequest 
Instance details

Defined in LndClient.Data.OpenChannel

Methods

docPrec :: Int -> OpenChannelRequest -> Doc #

doc :: OpenChannelRequest -> Doc #

docList :: [OpenChannelRequest] -> Doc #

Out OpenStatusUpdate 
Instance details

Defined in LndClient.Data.OpenChannel

Methods

docPrec :: Int -> OpenStatusUpdate -> Doc #

doc :: OpenStatusUpdate -> Doc #

docList :: [OpenStatusUpdate] -> Doc #

Out OpenStatusUpdate' 
Instance details

Defined in LndClient.Data.OpenChannel

Methods

docPrec :: Int -> OpenStatusUpdate' -> Doc #

doc :: OpenStatusUpdate' -> Doc #

docList :: [OpenStatusUpdate'] -> Doc #

Out ReadyForPsbtFunding 
Instance details

Defined in LndClient.Data.OpenChannel

Methods

docPrec :: Int -> ReadyForPsbtFunding -> Doc #

doc :: ReadyForPsbtFunding -> Doc #

docList :: [ReadyForPsbtFunding] -> Doc #

Out OutPoint 
Instance details

Defined in LndClient.Data.OutPoint

Methods

docPrec :: Int -> OutPoint -> Doc #

doc :: OutPoint -> Doc #

docList :: [OutPoint] -> Doc #

Out PayReq 
Instance details

Defined in LndClient.Data.PayReq

Methods

docPrec :: Int -> PayReq -> Doc #

doc :: PayReq -> Doc #

docList :: [PayReq] -> Doc #

Out Payment 
Instance details

Defined in LndClient.Data.Payment

Methods

docPrec :: Int -> Payment -> Doc #

doc :: Payment -> Doc #

docList :: [Payment] -> Doc #

Out PaymentStatus 
Instance details

Defined in LndClient.Data.Payment

Methods

docPrec :: Int -> PaymentStatus -> Doc #

doc :: PaymentStatus -> Doc #

docList :: [PaymentStatus] -> Doc #

Out ConnectPeerRequest 
Instance details

Defined in LndClient.Data.Peer

Methods

docPrec :: Int -> ConnectPeerRequest -> Doc #

doc :: ConnectPeerRequest -> Doc #

docList :: [ConnectPeerRequest] -> Doc #

Out LightningAddress 
Instance details

Defined in LndClient.Data.Peer

Methods

docPrec :: Int -> LightningAddress -> Doc #

doc :: LightningAddress -> Doc #

docList :: [LightningAddress] -> Doc #

Out Peer 
Instance details

Defined in LndClient.Data.Peer

Methods

docPrec :: Int -> Peer -> Doc #

doc :: Peer -> Doc #

docList :: [Peer] -> Doc #

Out PendingChannel 
Instance details

Defined in LndClient.Data.PendingChannel

Methods

docPrec :: Int -> PendingChannel -> Doc #

doc :: PendingChannel -> Doc #

docList :: [PendingChannel] -> Doc #

Out PendingChannelsResponse 
Instance details

Defined in LndClient.Data.PendingChannels

Methods

docPrec :: Int -> PendingChannelsResponse -> Doc #

doc :: PendingChannelsResponse -> Doc #

docList :: [PendingChannelsResponse] -> Doc #

Out PendingOpenChannel 
Instance details

Defined in LndClient.Data.PendingOpenChannel

Methods

docPrec :: Int -> PendingOpenChannel -> Doc #

doc :: PendingOpenChannel -> Doc #

docList :: [PendingOpenChannel] -> Doc #

Out PsbtShim 
Instance details

Defined in LndClient.Data.PsbtShim

Methods

docPrec :: Int -> PsbtShim -> Doc #

doc :: PsbtShim -> Doc #

docList :: [PsbtShim] -> Doc #

Out PublishTransactionRequest 
Instance details

Defined in LndClient.Data.PublishTransaction

Methods

docPrec :: Int -> PublishTransactionRequest -> Doc #

doc :: PublishTransactionRequest -> Doc #

docList :: [PublishTransactionRequest] -> Doc #

Out PublishTransactionResponse 
Instance details

Defined in LndClient.Data.PublishTransaction

Methods

docPrec :: Int -> PublishTransactionResponse -> Doc #

doc :: PublishTransactionResponse -> Doc #

docList :: [PublishTransactionResponse] -> Doc #

Out ReleaseOutputRequest 
Instance details

Defined in LndClient.Data.ReleaseOutput

Methods

docPrec :: Int -> ReleaseOutputRequest -> Doc #

doc :: ReleaseOutputRequest -> Doc #

docList :: [ReleaseOutputRequest] -> Doc #

Out ReleaseOutputResponse 
Instance details

Defined in LndClient.Data.ReleaseOutput

Methods

docPrec :: Int -> ReleaseOutputResponse -> Doc #

doc :: ReleaseOutputResponse -> Doc #

docList :: [ReleaseOutputResponse] -> Doc #

Out SendCoinsRequest 
Instance details

Defined in LndClient.Data.SendCoins

Methods

docPrec :: Int -> SendCoinsRequest -> Doc #

doc :: SendCoinsRequest -> Doc #

docList :: [SendCoinsRequest] -> Doc #

Out SendCoinsResponse 
Instance details

Defined in LndClient.Data.SendCoins

Methods

docPrec :: Int -> SendCoinsResponse -> Doc #

doc :: SendCoinsResponse -> Doc #

docList :: [SendCoinsResponse] -> Doc #

Out SendPaymentRequest 
Instance details

Defined in LndClient.Data.SendPayment

Methods

docPrec :: Int -> SendPaymentRequest -> Doc #

doc :: SendPaymentRequest -> Doc #

docList :: [SendPaymentRequest] -> Doc #

Out SendPaymentResponse 
Instance details

Defined in LndClient.Data.SendPayment

Methods

docPrec :: Int -> SendPaymentResponse -> Doc #

doc :: SendPaymentResponse -> Doc #

docList :: [SendPaymentResponse] -> Doc #

Out KeyLocator 
Instance details

Defined in LndClient.Data.SignMessage

Methods

docPrec :: Int -> KeyLocator -> Doc #

doc :: KeyLocator -> Doc #

docList :: [KeyLocator] -> Doc #

Out SignMessageRequest 
Instance details

Defined in LndClient.Data.SignMessage

Methods

docPrec :: Int -> SignMessageRequest -> Doc #

doc :: SignMessageRequest -> Doc #

docList :: [SignMessageRequest] -> Doc #

Out SignMessageResponse 
Instance details

Defined in LndClient.Data.SignMessage

Methods

docPrec :: Int -> SignMessageResponse -> Doc #

doc :: SignMessageResponse -> Doc #

docList :: [SignMessageResponse] -> Doc #

Out ChannelEventUpdate 
Instance details

Defined in LndClient.Data.SubscribeChannelEvents

Methods

docPrec :: Int -> ChannelEventUpdate -> Doc #

doc :: ChannelEventUpdate -> Doc #

docList :: [ChannelEventUpdate] -> Doc #

Out UpdateChannel 
Instance details

Defined in LndClient.Data.SubscribeChannelEvents

Methods

docPrec :: Int -> UpdateChannel -> Doc #

doc :: UpdateChannel -> Doc #

docList :: [UpdateChannel] -> Doc #

Out UpdateType 
Instance details

Defined in LndClient.Data.SubscribeChannelEvents

Methods

docPrec :: Int -> UpdateType -> Doc #

doc :: UpdateType -> Doc #

docList :: [UpdateType] -> Doc #

Out SubscribeInvoicesRequest 
Instance details

Defined in LndClient.Data.SubscribeInvoices

Methods

docPrec :: Int -> SubscribeInvoicesRequest -> Doc #

doc :: SubscribeInvoicesRequest -> Doc #

docList :: [SubscribeInvoicesRequest] -> Doc #

Out TrackPaymentRequest 
Instance details

Defined in LndClient.Data.TrackPayment

Methods

docPrec :: Int -> TrackPaymentRequest -> Doc #

doc :: TrackPaymentRequest -> Doc #

docList :: [TrackPaymentRequest] -> Doc #

Out LnInitiator 
Instance details

Defined in LndClient.Data.Type

Methods

docPrec :: Int -> LnInitiator -> Doc #

doc :: LnInitiator -> Doc #

docList :: [LnInitiator] -> Doc #

Out LndError 
Instance details

Defined in LndClient.Data.Type

Methods

docPrec :: Int -> LndError -> Doc #

doc :: LndError -> Doc #

docList :: [LndError] -> Doc #

Out LoggingMeta 
Instance details

Defined in LndClient.Data.Type

Methods

docPrec :: Int -> LoggingMeta -> Doc #

doc :: LoggingMeta -> Doc #

docList :: [LoggingMeta] -> Doc #

Out VerifyMessageRequest 
Instance details

Defined in LndClient.Data.VerifyMessage

Methods

docPrec :: Int -> VerifyMessageRequest -> Doc #

doc :: VerifyMessageRequest -> Doc #

docList :: [VerifyMessageRequest] -> Doc #

Out VerifyMessageResponse 
Instance details

Defined in LndClient.Data.VerifyMessage

Methods

docPrec :: Int -> VerifyMessageResponse -> Doc #

doc :: VerifyMessageResponse -> Doc #

docList :: [VerifyMessageResponse] -> Doc #

Out WaitingCloseChannel 
Instance details

Defined in LndClient.Data.WaitingCloseChannel

Methods

docPrec :: Int -> WaitingCloseChannel -> Doc #

doc :: WaitingCloseChannel -> Doc #

docList :: [WaitingCloseChannel] -> Doc #

Out WalletBalance 
Instance details

Defined in LndClient.Data.WalletBalance

Methods

docPrec :: Int -> WalletBalance -> Doc #

doc :: WalletBalance -> Doc #

docList :: [WalletBalance] -> Doc #

Out RpcName 
Instance details

Defined in LndClient.RPC.Generic

Methods

docPrec :: Int -> RpcName -> Doc #

doc :: RpcName -> Doc #

docList :: [RpcName] -> Doc #

Out AddHoldInvoiceRequest 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

docPrec :: Int -> AddHoldInvoiceRequest -> Doc #

doc :: AddHoldInvoiceRequest -> Doc #

docList :: [AddHoldInvoiceRequest] -> Doc #

Out AddHoldInvoiceResp 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

docPrec :: Int -> AddHoldInvoiceResp -> Doc #

doc :: AddHoldInvoiceResp -> Doc #

docList :: [AddHoldInvoiceResp] -> Doc #

Out CancelInvoiceMsg 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

docPrec :: Int -> CancelInvoiceMsg -> Doc #

doc :: CancelInvoiceMsg -> Doc #

docList :: [CancelInvoiceMsg] -> Doc #

Out CancelInvoiceResp 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

docPrec :: Int -> CancelInvoiceResp -> Doc #

doc :: CancelInvoiceResp -> Doc #

docList :: [CancelInvoiceResp] -> Doc #

Out LookupInvoiceMsg 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

docPrec :: Int -> LookupInvoiceMsg -> Doc #

doc :: LookupInvoiceMsg -> Doc #

docList :: [LookupInvoiceMsg] -> Doc #

Out LookupInvoiceMsg'InvoiceRef 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

docPrec :: Int -> LookupInvoiceMsg'InvoiceRef -> Doc #

doc :: LookupInvoiceMsg'InvoiceRef -> Doc #

docList :: [LookupInvoiceMsg'InvoiceRef] -> Doc #

Out LookupModifier 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

docPrec :: Int -> LookupModifier -> Doc #

doc :: LookupModifier -> Doc #

docList :: [LookupModifier] -> Doc #

Out LookupModifier'UnrecognizedValue 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

docPrec :: Int -> LookupModifier'UnrecognizedValue -> Doc #

doc :: LookupModifier'UnrecognizedValue -> Doc #

docList :: [LookupModifier'UnrecognizedValue] -> Doc #

Out SettleInvoiceMsg 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

docPrec :: Int -> SettleInvoiceMsg -> Doc #

doc :: SettleInvoiceMsg -> Doc #

docList :: [SettleInvoiceMsg] -> Doc #

Out SettleInvoiceResp 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

docPrec :: Int -> SettleInvoiceResp -> Doc #

doc :: SettleInvoiceResp -> Doc #

docList :: [SettleInvoiceResp] -> Doc #

Out SubscribeSingleInvoiceRequest 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

docPrec :: Int -> SubscribeSingleInvoiceRequest -> Doc #

doc :: SubscribeSingleInvoiceRequest -> Doc #

docList :: [SubscribeSingleInvoiceRequest] -> Doc #

Out AddressType 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> AddressType -> Doc #

doc :: AddressType -> Doc #

docList :: [AddressType] -> Doc #

Out AddressType'UnrecognizedValue 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> AddressType'UnrecognizedValue -> Doc #

doc :: AddressType'UnrecognizedValue -> Doc #

docList :: [AddressType'UnrecognizedValue] -> Doc #

Out BatchOpenChannel 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> BatchOpenChannel -> Doc #

doc :: BatchOpenChannel -> Doc #

docList :: [BatchOpenChannel] -> Doc #

Out BatchOpenChannelRequest 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> BatchOpenChannelRequest -> Doc #

doc :: BatchOpenChannelRequest -> Doc #

docList :: [BatchOpenChannelRequest] -> Doc #

Out BatchOpenChannelResponse 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> BatchOpenChannelResponse -> Doc #

doc :: BatchOpenChannelResponse -> Doc #

docList :: [BatchOpenChannelResponse] -> Doc #

Out Chain 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> Chain -> Doc #

doc :: Chain -> Doc #

docList :: [Chain] -> Doc #

Out ChannelAcceptRequest 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> ChannelAcceptRequest -> Doc #

doc :: ChannelAcceptRequest -> Doc #

docList :: [ChannelAcceptRequest] -> Doc #

Out ChannelAcceptResponse 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> ChannelAcceptResponse -> Doc #

doc :: ChannelAcceptResponse -> Doc #

docList :: [ChannelAcceptResponse] -> Doc #

Out ChannelCloseUpdate 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> ChannelCloseUpdate -> Doc #

doc :: ChannelCloseUpdate -> Doc #

docList :: [ChannelCloseUpdate] -> Doc #

Out ChannelOpenUpdate 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> ChannelOpenUpdate -> Doc #

doc :: ChannelOpenUpdate -> Doc #

docList :: [ChannelOpenUpdate] -> Doc #

Out CloseChannelRequest 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> CloseChannelRequest -> Doc #

doc :: CloseChannelRequest -> Doc #

docList :: [CloseChannelRequest] -> Doc #

Out CloseStatusUpdate 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> CloseStatusUpdate -> Doc #

doc :: CloseStatusUpdate -> Doc #

docList :: [CloseStatusUpdate] -> Doc #

Out CloseStatusUpdate'Update 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> CloseStatusUpdate'Update -> Doc #

doc :: CloseStatusUpdate'Update -> Doc #

docList :: [CloseStatusUpdate'Update] -> Doc #

Out ClosedChannelsRequest 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> ClosedChannelsRequest -> Doc #

doc :: ClosedChannelsRequest -> Doc #

docList :: [ClosedChannelsRequest] -> Doc #

Out ClosedChannelsResponse 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> ClosedChannelsResponse -> Doc #

doc :: ClosedChannelsResponse -> Doc #

docList :: [ClosedChannelsResponse] -> Doc #

Out ConfirmationUpdate 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> ConfirmationUpdate -> Doc #

doc :: ConfirmationUpdate -> Doc #

docList :: [ConfirmationUpdate] -> Doc #

Out ConnectPeerRequest 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> ConnectPeerRequest -> Doc #

doc :: ConnectPeerRequest -> Doc #

docList :: [ConnectPeerRequest] -> Doc #

Out ConnectPeerResponse 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> ConnectPeerResponse -> Doc #

doc :: ConnectPeerResponse -> Doc #

docList :: [ConnectPeerResponse] -> Doc #

Out CustomMessage 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> CustomMessage -> Doc #

doc :: CustomMessage -> Doc #

docList :: [CustomMessage] -> Doc #

Out DisconnectPeerRequest 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> DisconnectPeerRequest -> Doc #

doc :: DisconnectPeerRequest -> Doc #

docList :: [DisconnectPeerRequest] -> Doc #

Out DisconnectPeerResponse 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> DisconnectPeerResponse -> Doc #

doc :: DisconnectPeerResponse -> Doc #

docList :: [DisconnectPeerResponse] -> Doc #

Out EstimateFeeRequest 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> EstimateFeeRequest -> Doc #

doc :: EstimateFeeRequest -> Doc #

docList :: [EstimateFeeRequest] -> Doc #

Out EstimateFeeRequest'AddrToAmountEntry 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> EstimateFeeRequest'AddrToAmountEntry -> Doc #

doc :: EstimateFeeRequest'AddrToAmountEntry -> Doc #

docList :: [EstimateFeeRequest'AddrToAmountEntry] -> Doc #

Out EstimateFeeResponse 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> EstimateFeeResponse -> Doc #

doc :: EstimateFeeResponse -> Doc #

docList :: [EstimateFeeResponse] -> Doc #

Out GetInfoRequest 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> GetInfoRequest -> Doc #

doc :: GetInfoRequest -> Doc #

docList :: [GetInfoRequest] -> Doc #

Out GetInfoResponse 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> GetInfoResponse -> Doc #

doc :: GetInfoResponse -> Doc #

docList :: [GetInfoResponse] -> Doc #

Out GetInfoResponse'FeaturesEntry 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> GetInfoResponse'FeaturesEntry -> Doc #

doc :: GetInfoResponse'FeaturesEntry -> Doc #

docList :: [GetInfoResponse'FeaturesEntry] -> Doc #

Out GetRecoveryInfoRequest 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> GetRecoveryInfoRequest -> Doc #

doc :: GetRecoveryInfoRequest -> Doc #

docList :: [GetRecoveryInfoRequest] -> Doc #

Out GetRecoveryInfoResponse 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> GetRecoveryInfoResponse -> Doc #

doc :: GetRecoveryInfoResponse -> Doc #

docList :: [GetRecoveryInfoResponse] -> Doc #

Out GetTransactionsRequest 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> GetTransactionsRequest -> Doc #

doc :: GetTransactionsRequest -> Doc #

docList :: [GetTransactionsRequest] -> Doc #

Out LightningAddress 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> LightningAddress -> Doc #

doc :: LightningAddress -> Doc #

docList :: [LightningAddress] -> Doc #

Out ListChannelsRequest 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> ListChannelsRequest -> Doc #

doc :: ListChannelsRequest -> Doc #

docList :: [ListChannelsRequest] -> Doc #

Out ListChannelsResponse 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> ListChannelsResponse -> Doc #

doc :: ListChannelsResponse -> Doc #

docList :: [ListChannelsResponse] -> Doc #

Out ListPeersRequest 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> ListPeersRequest -> Doc #

doc :: ListPeersRequest -> Doc #

docList :: [ListPeersRequest] -> Doc #

Out ListPeersResponse 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> ListPeersResponse -> Doc #

doc :: ListPeersResponse -> Doc #

docList :: [ListPeersResponse] -> Doc #

Out ListUnspentRequest 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> ListUnspentRequest -> Doc #

doc :: ListUnspentRequest -> Doc #

docList :: [ListUnspentRequest] -> Doc #

Out ListUnspentResponse 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> ListUnspentResponse -> Doc #

doc :: ListUnspentResponse -> Doc #

docList :: [ListUnspentResponse] -> Doc #

Out NewAddressRequest 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> NewAddressRequest -> Doc #

doc :: NewAddressRequest -> Doc #

docList :: [NewAddressRequest] -> Doc #

Out NewAddressResponse 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> NewAddressResponse -> Doc #

doc :: NewAddressResponse -> Doc #

docList :: [NewAddressResponse] -> Doc #

Out OpenChannelRequest 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> OpenChannelRequest -> Doc #

doc :: OpenChannelRequest -> Doc #

docList :: [OpenChannelRequest] -> Doc #

Out OpenStatusUpdate 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> OpenStatusUpdate -> Doc #

doc :: OpenStatusUpdate -> Doc #

docList :: [OpenStatusUpdate] -> Doc #

Out OpenStatusUpdate'Update 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> OpenStatusUpdate'Update -> Doc #

doc :: OpenStatusUpdate'Update -> Doc #

docList :: [OpenStatusUpdate'Update] -> Doc #

Out Peer 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> Peer -> Doc #

doc :: Peer -> Doc #

docList :: [Peer] -> Doc #

Out Peer'FeaturesEntry 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> Peer'FeaturesEntry -> Doc #

doc :: Peer'FeaturesEntry -> Doc #

docList :: [Peer'FeaturesEntry] -> Doc #

Out Peer'SyncType 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> Peer'SyncType -> Doc #

doc :: Peer'SyncType -> Doc #

docList :: [Peer'SyncType] -> Doc #

Out Peer'SyncType'UnrecognizedValue 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> Peer'SyncType'UnrecognizedValue -> Doc #

doc :: Peer'SyncType'UnrecognizedValue -> Doc #

docList :: [Peer'SyncType'UnrecognizedValue] -> Doc #

Out PeerEvent 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> PeerEvent -> Doc #

doc :: PeerEvent -> Doc #

docList :: [PeerEvent] -> Doc #

Out PeerEvent'EventType 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> PeerEvent'EventType -> Doc #

doc :: PeerEvent'EventType -> Doc #

docList :: [PeerEvent'EventType] -> Doc #

Out PeerEvent'EventType'UnrecognizedValue 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> PeerEvent'EventType'UnrecognizedValue -> Doc #

doc :: PeerEvent'EventType'UnrecognizedValue -> Doc #

docList :: [PeerEvent'EventType'UnrecognizedValue] -> Doc #

Out PeerEventSubscription 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> PeerEventSubscription -> Doc #

doc :: PeerEventSubscription -> Doc #

docList :: [PeerEventSubscription] -> Doc #

Out ReadyForPsbtFunding 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> ReadyForPsbtFunding -> Doc #

doc :: ReadyForPsbtFunding -> Doc #

docList :: [ReadyForPsbtFunding] -> Doc #

Out SendCoinsRequest 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> SendCoinsRequest -> Doc #

doc :: SendCoinsRequest -> Doc #

docList :: [SendCoinsRequest] -> Doc #

Out SendCoinsResponse 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> SendCoinsResponse -> Doc #

doc :: SendCoinsResponse -> Doc #

docList :: [SendCoinsResponse] -> Doc #

Out SendCustomMessageRequest 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> SendCustomMessageRequest -> Doc #

doc :: SendCustomMessageRequest -> Doc #

docList :: [SendCustomMessageRequest] -> Doc #

Out SendCustomMessageResponse 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> SendCustomMessageResponse -> Doc #

doc :: SendCustomMessageResponse -> Doc #

docList :: [SendCustomMessageResponse] -> Doc #

Out SendManyRequest 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> SendManyRequest -> Doc #

doc :: SendManyRequest -> Doc #

docList :: [SendManyRequest] -> Doc #

Out SendManyRequest'AddrToAmountEntry 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> SendManyRequest'AddrToAmountEntry -> Doc #

doc :: SendManyRequest'AddrToAmountEntry -> Doc #

docList :: [SendManyRequest'AddrToAmountEntry] -> Doc #

Out SendManyResponse 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> SendManyResponse -> Doc #

doc :: SendManyResponse -> Doc #

docList :: [SendManyResponse] -> Doc #

Out SendRequest 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> SendRequest -> Doc #

doc :: SendRequest -> Doc #

docList :: [SendRequest] -> Doc #

Out SendRequest'DestCustomRecordsEntry 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> SendRequest'DestCustomRecordsEntry -> Doc #

doc :: SendRequest'DestCustomRecordsEntry -> Doc #

docList :: [SendRequest'DestCustomRecordsEntry] -> Doc #

Out SendResponse 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> SendResponse -> Doc #

doc :: SendResponse -> Doc #

docList :: [SendResponse] -> Doc #

Out SendToRouteRequest 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> SendToRouteRequest -> Doc #

doc :: SendToRouteRequest -> Doc #

docList :: [SendToRouteRequest] -> Doc #

Out SignMessageRequest 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> SignMessageRequest -> Doc #

doc :: SignMessageRequest -> Doc #

docList :: [SignMessageRequest] -> Doc #

Out SignMessageResponse 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> SignMessageResponse -> Doc #

doc :: SignMessageResponse -> Doc #

docList :: [SignMessageResponse] -> Doc #

Out SubscribeCustomMessagesRequest 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> SubscribeCustomMessagesRequest -> Doc #

doc :: SubscribeCustomMessagesRequest -> Doc #

docList :: [SubscribeCustomMessagesRequest] -> Doc #

Out TimestampedError 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> TimestampedError -> Doc #

doc :: TimestampedError -> Doc #

docList :: [TimestampedError] -> Doc #

Out Transaction 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> Transaction -> Doc #

doc :: Transaction -> Doc #

docList :: [Transaction] -> Doc #

Out TransactionDetails 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> TransactionDetails -> Doc #

doc :: TransactionDetails -> Doc #

docList :: [TransactionDetails] -> Doc #

Out Utxo 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> Utxo -> Doc #

doc :: Utxo -> Doc #

docList :: [Utxo] -> Doc #

Out VerifyMessageRequest 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> VerifyMessageRequest -> Doc #

doc :: VerifyMessageRequest -> Doc #

docList :: [VerifyMessageRequest] -> Doc #

Out VerifyMessageResponse 
Instance details

Defined in Proto.Lightning

Methods

docPrec :: Int -> VerifyMessageResponse -> Doc #

doc :: VerifyMessageResponse -> Doc #

docList :: [VerifyMessageResponse] -> Doc #

Out AMPRecord 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> AMPRecord -> Doc #

doc :: AMPRecord -> Doc #

docList :: [AMPRecord] -> Doc #

Out Amount 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> Amount -> Doc #

doc :: Amount -> Doc #

docList :: [Amount] -> Doc #

Out ChanInfoRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> ChanInfoRequest -> Doc #

doc :: ChanInfoRequest -> Doc #

docList :: [ChanInfoRequest] -> Doc #

Out ChanPointShim 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> ChanPointShim -> Doc #

doc :: ChanPointShim -> Doc #

docList :: [ChanPointShim] -> Doc #

Out Channel 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> Channel -> Doc #

doc :: Channel -> Doc #

docList :: [Channel] -> Doc #

Out ChannelBalanceRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> ChannelBalanceRequest -> Doc #

doc :: ChannelBalanceRequest -> Doc #

docList :: [ChannelBalanceRequest] -> Doc #

Out ChannelBalanceResponse 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> ChannelBalanceResponse -> Doc #

doc :: ChannelBalanceResponse -> Doc #

docList :: [ChannelBalanceResponse] -> Doc #

Out ChannelCloseSummary 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> ChannelCloseSummary -> Doc #

doc :: ChannelCloseSummary -> Doc #

docList :: [ChannelCloseSummary] -> Doc #

Out ChannelCloseSummary'ClosureType 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> ChannelCloseSummary'ClosureType -> Doc #

doc :: ChannelCloseSummary'ClosureType -> Doc #

docList :: [ChannelCloseSummary'ClosureType] -> Doc #

Out ChannelCloseSummary'ClosureType'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> ChannelCloseSummary'ClosureType'UnrecognizedValue -> Doc #

doc :: ChannelCloseSummary'ClosureType'UnrecognizedValue -> Doc #

docList :: [ChannelCloseSummary'ClosureType'UnrecognizedValue] -> Doc #

Out ChannelConstraints 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> ChannelConstraints -> Doc #

doc :: ChannelConstraints -> Doc #

docList :: [ChannelConstraints] -> Doc #

Out ChannelEdge 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> ChannelEdge -> Doc #

doc :: ChannelEdge -> Doc #

docList :: [ChannelEdge] -> Doc #

Out ChannelEdgeUpdate 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> ChannelEdgeUpdate -> Doc #

doc :: ChannelEdgeUpdate -> Doc #

docList :: [ChannelEdgeUpdate] -> Doc #

Out ChannelEventSubscription 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> ChannelEventSubscription -> Doc #

doc :: ChannelEventSubscription -> Doc #

docList :: [ChannelEventSubscription] -> Doc #

Out ChannelEventUpdate 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> ChannelEventUpdate -> Doc #

doc :: ChannelEventUpdate -> Doc #

docList :: [ChannelEventUpdate] -> Doc #

Out ChannelEventUpdate'Channel 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> ChannelEventUpdate'Channel -> Doc #

doc :: ChannelEventUpdate'Channel -> Doc #

docList :: [ChannelEventUpdate'Channel] -> Doc #

Out ChannelEventUpdate'UpdateType 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> ChannelEventUpdate'UpdateType -> Doc #

doc :: ChannelEventUpdate'UpdateType -> Doc #

docList :: [ChannelEventUpdate'UpdateType] -> Doc #

Out ChannelEventUpdate'UpdateType'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> ChannelEventUpdate'UpdateType'UnrecognizedValue -> Doc #

doc :: ChannelEventUpdate'UpdateType'UnrecognizedValue -> Doc #

docList :: [ChannelEventUpdate'UpdateType'UnrecognizedValue] -> Doc #

Out ChannelGraph 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> ChannelGraph -> Doc #

doc :: ChannelGraph -> Doc #

docList :: [ChannelGraph] -> Doc #

Out ChannelGraphRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> ChannelGraphRequest -> Doc #

doc :: ChannelGraphRequest -> Doc #

docList :: [ChannelGraphRequest] -> Doc #

Out ChannelPoint 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> ChannelPoint -> Doc #

doc :: ChannelPoint -> Doc #

docList :: [ChannelPoint] -> Doc #

Out ChannelPoint'FundingTxid 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> ChannelPoint'FundingTxid -> Doc #

doc :: ChannelPoint'FundingTxid -> Doc #

docList :: [ChannelPoint'FundingTxid] -> Doc #

Out ClosedChannelUpdate 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> ClosedChannelUpdate -> Doc #

doc :: ClosedChannelUpdate -> Doc #

docList :: [ClosedChannelUpdate] -> Doc #

Out CommitmentType 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> CommitmentType -> Doc #

doc :: CommitmentType -> Doc #

docList :: [CommitmentType] -> Doc #

Out CommitmentType'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> CommitmentType'UnrecognizedValue -> Doc #

doc :: CommitmentType'UnrecognizedValue -> Doc #

docList :: [CommitmentType'UnrecognizedValue] -> Doc #

Out EdgeLocator 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> EdgeLocator -> Doc #

doc :: EdgeLocator -> Doc #

docList :: [EdgeLocator] -> Doc #

Out Feature 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> Feature -> Doc #

doc :: Feature -> Doc #

docList :: [Feature] -> Doc #

Out FeatureBit 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> FeatureBit -> Doc #

doc :: FeatureBit -> Doc #

docList :: [FeatureBit] -> Doc #

Out FeatureBit'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> FeatureBit'UnrecognizedValue -> Doc #

doc :: FeatureBit'UnrecognizedValue -> Doc #

docList :: [FeatureBit'UnrecognizedValue] -> Doc #

Out FeeLimit 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> FeeLimit -> Doc #

doc :: FeeLimit -> Doc #

docList :: [FeeLimit] -> Doc #

Out FeeLimit'Limit 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> FeeLimit'Limit -> Doc #

doc :: FeeLimit'Limit -> Doc #

docList :: [FeeLimit'Limit] -> Doc #

Out FloatMetric 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> FloatMetric -> Doc #

doc :: FloatMetric -> Doc #

docList :: [FloatMetric] -> Doc #

Out FundingPsbtFinalize 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> FundingPsbtFinalize -> Doc #

doc :: FundingPsbtFinalize -> Doc #

docList :: [FundingPsbtFinalize] -> Doc #

Out FundingPsbtVerify 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> FundingPsbtVerify -> Doc #

doc :: FundingPsbtVerify -> Doc #

docList :: [FundingPsbtVerify] -> Doc #

Out FundingShim 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> FundingShim -> Doc #

doc :: FundingShim -> Doc #

docList :: [FundingShim] -> Doc #

Out FundingShim'Shim 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> FundingShim'Shim -> Doc #

doc :: FundingShim'Shim -> Doc #

docList :: [FundingShim'Shim] -> Doc #

Out FundingShimCancel 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> FundingShimCancel -> Doc #

doc :: FundingShimCancel -> Doc #

docList :: [FundingShimCancel] -> Doc #

Out FundingStateStepResp 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> FundingStateStepResp -> Doc #

doc :: FundingStateStepResp -> Doc #

docList :: [FundingStateStepResp] -> Doc #

Out FundingTransitionMsg 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> FundingTransitionMsg -> Doc #

doc :: FundingTransitionMsg -> Doc #

docList :: [FundingTransitionMsg] -> Doc #

Out FundingTransitionMsg'Trigger 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> FundingTransitionMsg'Trigger -> Doc #

doc :: FundingTransitionMsg'Trigger -> Doc #

docList :: [FundingTransitionMsg'Trigger] -> Doc #

Out GraphTopologySubscription 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> GraphTopologySubscription -> Doc #

doc :: GraphTopologySubscription -> Doc #

docList :: [GraphTopologySubscription] -> Doc #

Out GraphTopologyUpdate 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> GraphTopologyUpdate -> Doc #

doc :: GraphTopologyUpdate -> Doc #

docList :: [GraphTopologyUpdate] -> Doc #

Out HTLC 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> HTLC -> Doc #

doc :: HTLC -> Doc #

docList :: [HTLC] -> Doc #

Out Hop 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> Hop -> Doc #

doc :: Hop -> Doc #

docList :: [Hop] -> Doc #

Out Hop'CustomRecordsEntry 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> Hop'CustomRecordsEntry -> Doc #

doc :: Hop'CustomRecordsEntry -> Doc #

docList :: [Hop'CustomRecordsEntry] -> Doc #

Out HopHint 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> HopHint -> Doc #

doc :: HopHint -> Doc #

docList :: [HopHint] -> Doc #

Out Initiator 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> Initiator -> Doc #

doc :: Initiator -> Doc #

docList :: [Initiator] -> Doc #

Out Initiator'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> Initiator'UnrecognizedValue -> Doc #

doc :: Initiator'UnrecognizedValue -> Doc #

docList :: [Initiator'UnrecognizedValue] -> Doc #

Out KeyDescriptor 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> KeyDescriptor -> Doc #

doc :: KeyDescriptor -> Doc #

docList :: [KeyDescriptor] -> Doc #

Out KeyLocator 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> KeyLocator -> Doc #

doc :: KeyLocator -> Doc #

docList :: [KeyLocator] -> Doc #

Out LightningNode 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> LightningNode -> Doc #

doc :: LightningNode -> Doc #

docList :: [LightningNode] -> Doc #

Out LightningNode'FeaturesEntry 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> LightningNode'FeaturesEntry -> Doc #

doc :: LightningNode'FeaturesEntry -> Doc #

docList :: [LightningNode'FeaturesEntry] -> Doc #

Out MPPRecord 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> MPPRecord -> Doc #

doc :: MPPRecord -> Doc #

docList :: [MPPRecord] -> Doc #

Out NetworkInfo 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> NetworkInfo -> Doc #

doc :: NetworkInfo -> Doc #

docList :: [NetworkInfo] -> Doc #

Out NetworkInfoRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> NetworkInfoRequest -> Doc #

doc :: NetworkInfoRequest -> Doc #

docList :: [NetworkInfoRequest] -> Doc #

Out NodeAddress 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> NodeAddress -> Doc #

doc :: NodeAddress -> Doc #

docList :: [NodeAddress] -> Doc #

Out NodeInfo 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> NodeInfo -> Doc #

doc :: NodeInfo -> Doc #

docList :: [NodeInfo] -> Doc #

Out NodeInfoRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> NodeInfoRequest -> Doc #

doc :: NodeInfoRequest -> Doc #

docList :: [NodeInfoRequest] -> Doc #

Out NodeMetricType 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> NodeMetricType -> Doc #

doc :: NodeMetricType -> Doc #

docList :: [NodeMetricType] -> Doc #

Out NodeMetricType'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> NodeMetricType'UnrecognizedValue -> Doc #

doc :: NodeMetricType'UnrecognizedValue -> Doc #

docList :: [NodeMetricType'UnrecognizedValue] -> Doc #

Out NodeMetricsRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> NodeMetricsRequest -> Doc #

doc :: NodeMetricsRequest -> Doc #

docList :: [NodeMetricsRequest] -> Doc #

Out NodeMetricsResponse 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> NodeMetricsResponse -> Doc #

doc :: NodeMetricsResponse -> Doc #

docList :: [NodeMetricsResponse] -> Doc #

Out NodeMetricsResponse'BetweennessCentralityEntry 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> NodeMetricsResponse'BetweennessCentralityEntry -> Doc #

doc :: NodeMetricsResponse'BetweennessCentralityEntry -> Doc #

docList :: [NodeMetricsResponse'BetweennessCentralityEntry] -> Doc #

Out NodePair 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> NodePair -> Doc #

doc :: NodePair -> Doc #

docList :: [NodePair] -> Doc #

Out NodeUpdate 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> NodeUpdate -> Doc #

doc :: NodeUpdate -> Doc #

docList :: [NodeUpdate] -> Doc #

Out NodeUpdate'FeaturesEntry 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> NodeUpdate'FeaturesEntry -> Doc #

doc :: NodeUpdate'FeaturesEntry -> Doc #

docList :: [NodeUpdate'FeaturesEntry] -> Doc #

Out OutPoint 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> OutPoint -> Doc #

doc :: OutPoint -> Doc #

docList :: [OutPoint] -> Doc #

Out PendingChannelsRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> PendingChannelsRequest -> Doc #

doc :: PendingChannelsRequest -> Doc #

docList :: [PendingChannelsRequest] -> Doc #

Out PendingChannelsResponse 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> PendingChannelsResponse -> Doc #

doc :: PendingChannelsResponse -> Doc #

docList :: [PendingChannelsResponse] -> Doc #

Out PendingChannelsResponse'ClosedChannel 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> PendingChannelsResponse'ClosedChannel -> Doc #

doc :: PendingChannelsResponse'ClosedChannel -> Doc #

docList :: [PendingChannelsResponse'ClosedChannel] -> Doc #

Out PendingChannelsResponse'Commitments 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> PendingChannelsResponse'Commitments -> Doc #

doc :: PendingChannelsResponse'Commitments -> Doc #

docList :: [PendingChannelsResponse'Commitments] -> Doc #

Out PendingChannelsResponse'ForceClosedChannel 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> PendingChannelsResponse'ForceClosedChannel -> Doc #

doc :: PendingChannelsResponse'ForceClosedChannel -> Doc #

docList :: [PendingChannelsResponse'ForceClosedChannel] -> Doc #

Out PendingChannelsResponse'ForceClosedChannel'AnchorState 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> PendingChannelsResponse'ForceClosedChannel'AnchorState -> Doc #

doc :: PendingChannelsResponse'ForceClosedChannel'AnchorState -> Doc #

docList :: [PendingChannelsResponse'ForceClosedChannel'AnchorState] -> Doc #

Out PendingChannelsResponse'ForceClosedChannel'AnchorState'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> PendingChannelsResponse'ForceClosedChannel'AnchorState'UnrecognizedValue -> Doc #

doc :: PendingChannelsResponse'ForceClosedChannel'AnchorState'UnrecognizedValue -> Doc #

docList :: [PendingChannelsResponse'ForceClosedChannel'AnchorState'UnrecognizedValue] -> Doc #

Out PendingChannelsResponse'PendingChannel 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> PendingChannelsResponse'PendingChannel -> Doc #

doc :: PendingChannelsResponse'PendingChannel -> Doc #

docList :: [PendingChannelsResponse'PendingChannel] -> Doc #

Out PendingChannelsResponse'PendingOpenChannel 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> PendingChannelsResponse'PendingOpenChannel -> Doc #

doc :: PendingChannelsResponse'PendingOpenChannel -> Doc #

docList :: [PendingChannelsResponse'PendingOpenChannel] -> Doc #

Out PendingChannelsResponse'WaitingCloseChannel 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> PendingChannelsResponse'WaitingCloseChannel -> Doc #

doc :: PendingChannelsResponse'WaitingCloseChannel -> Doc #

docList :: [PendingChannelsResponse'WaitingCloseChannel] -> Doc #

Out PendingHTLC 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> PendingHTLC -> Doc #

doc :: PendingHTLC -> Doc #

docList :: [PendingHTLC] -> Doc #

Out PendingUpdate 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> PendingUpdate -> Doc #

doc :: PendingUpdate -> Doc #

docList :: [PendingUpdate] -> Doc #

Out PsbtShim 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> PsbtShim -> Doc #

doc :: PsbtShim -> Doc #

docList :: [PsbtShim] -> Doc #

Out QueryRoutesRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> QueryRoutesRequest -> Doc #

doc :: QueryRoutesRequest -> Doc #

docList :: [QueryRoutesRequest] -> Doc #

Out QueryRoutesRequest'DestCustomRecordsEntry 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> QueryRoutesRequest'DestCustomRecordsEntry -> Doc #

doc :: QueryRoutesRequest'DestCustomRecordsEntry -> Doc #

docList :: [QueryRoutesRequest'DestCustomRecordsEntry] -> Doc #

Out QueryRoutesResponse 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> QueryRoutesResponse -> Doc #

doc :: QueryRoutesResponse -> Doc #

docList :: [QueryRoutesResponse] -> Doc #

Out Resolution 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> Resolution -> Doc #

doc :: Resolution -> Doc #

docList :: [Resolution] -> Doc #

Out ResolutionOutcome 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> ResolutionOutcome -> Doc #

doc :: ResolutionOutcome -> Doc #

docList :: [ResolutionOutcome] -> Doc #

Out ResolutionOutcome'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> ResolutionOutcome'UnrecognizedValue -> Doc #

doc :: ResolutionOutcome'UnrecognizedValue -> Doc #

docList :: [ResolutionOutcome'UnrecognizedValue] -> Doc #

Out ResolutionType 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> ResolutionType -> Doc #

doc :: ResolutionType -> Doc #

docList :: [ResolutionType] -> Doc #

Out ResolutionType'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> ResolutionType'UnrecognizedValue -> Doc #

doc :: ResolutionType'UnrecognizedValue -> Doc #

docList :: [ResolutionType'UnrecognizedValue] -> Doc #

Out Route 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> Route -> Doc #

doc :: Route -> Doc #

docList :: [Route] -> Doc #

Out RouteHint 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> RouteHint -> Doc #

doc :: RouteHint -> Doc #

docList :: [RouteHint] -> Doc #

Out RoutingPolicy 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> RoutingPolicy -> Doc #

doc :: RoutingPolicy -> Doc #

docList :: [RoutingPolicy] -> Doc #

Out StopRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> StopRequest -> Doc #

doc :: StopRequest -> Doc #

docList :: [StopRequest] -> Doc #

Out StopResponse 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> StopResponse -> Doc #

doc :: StopResponse -> Doc #

docList :: [StopResponse] -> Doc #

Out WalletAccountBalance 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> WalletAccountBalance -> Doc #

doc :: WalletAccountBalance -> Doc #

docList :: [WalletAccountBalance] -> Doc #

Out WalletBalanceRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> WalletBalanceRequest -> Doc #

doc :: WalletBalanceRequest -> Doc #

docList :: [WalletBalanceRequest] -> Doc #

Out WalletBalanceResponse 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> WalletBalanceResponse -> Doc #

doc :: WalletBalanceResponse -> Doc #

docList :: [WalletBalanceResponse] -> Doc #

Out WalletBalanceResponse'AccountBalanceEntry 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

docPrec :: Int -> WalletBalanceResponse'AccountBalanceEntry -> Doc #

doc :: WalletBalanceResponse'AccountBalanceEntry -> Doc #

docList :: [WalletBalanceResponse'AccountBalanceEntry] -> Doc #

Out AMP 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> AMP -> Doc #

doc :: AMP -> Doc #

docList :: [AMP] -> Doc #

Out AMPInvoiceState 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> AMPInvoiceState -> Doc #

doc :: AMPInvoiceState -> Doc #

docList :: [AMPInvoiceState] -> Doc #

Out AbandonChannelRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> AbandonChannelRequest -> Doc #

doc :: AbandonChannelRequest -> Doc #

docList :: [AbandonChannelRequest] -> Doc #

Out AbandonChannelResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> AbandonChannelResponse -> Doc #

doc :: AbandonChannelResponse -> Doc #

docList :: [AbandonChannelResponse] -> Doc #

Out AddInvoiceResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> AddInvoiceResponse -> Doc #

doc :: AddInvoiceResponse -> Doc #

docList :: [AddInvoiceResponse] -> Doc #

Out BakeMacaroonRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> BakeMacaroonRequest -> Doc #

doc :: BakeMacaroonRequest -> Doc #

docList :: [BakeMacaroonRequest] -> Doc #

Out BakeMacaroonResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> BakeMacaroonResponse -> Doc #

doc :: BakeMacaroonResponse -> Doc #

docList :: [BakeMacaroonResponse] -> Doc #

Out ChanBackupExportRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> ChanBackupExportRequest -> Doc #

doc :: ChanBackupExportRequest -> Doc #

docList :: [ChanBackupExportRequest] -> Doc #

Out ChanBackupSnapshot 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> ChanBackupSnapshot -> Doc #

doc :: ChanBackupSnapshot -> Doc #

docList :: [ChanBackupSnapshot] -> Doc #

Out ChannelBackup 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> ChannelBackup -> Doc #

doc :: ChannelBackup -> Doc #

docList :: [ChannelBackup] -> Doc #

Out ChannelBackupSubscription 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> ChannelBackupSubscription -> Doc #

doc :: ChannelBackupSubscription -> Doc #

docList :: [ChannelBackupSubscription] -> Doc #

Out ChannelBackups 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> ChannelBackups -> Doc #

doc :: ChannelBackups -> Doc #

docList :: [ChannelBackups] -> Doc #

Out ChannelFeeReport 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> ChannelFeeReport -> Doc #

doc :: ChannelFeeReport -> Doc #

docList :: [ChannelFeeReport] -> Doc #

Out ChannelUpdate 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> ChannelUpdate -> Doc #

doc :: ChannelUpdate -> Doc #

docList :: [ChannelUpdate] -> Doc #

Out CheckMacPermRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> CheckMacPermRequest -> Doc #

doc :: CheckMacPermRequest -> Doc #

docList :: [CheckMacPermRequest] -> Doc #

Out CheckMacPermResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> CheckMacPermResponse -> Doc #

doc :: CheckMacPermResponse -> Doc #

docList :: [CheckMacPermResponse] -> Doc #

Out DebugLevelRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> DebugLevelRequest -> Doc #

doc :: DebugLevelRequest -> Doc #

docList :: [DebugLevelRequest] -> Doc #

Out DebugLevelResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> DebugLevelResponse -> Doc #

doc :: DebugLevelResponse -> Doc #

docList :: [DebugLevelResponse] -> Doc #

Out DeleteAllPaymentsRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> DeleteAllPaymentsRequest -> Doc #

doc :: DeleteAllPaymentsRequest -> Doc #

docList :: [DeleteAllPaymentsRequest] -> Doc #

Out DeleteAllPaymentsResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> DeleteAllPaymentsResponse -> Doc #

doc :: DeleteAllPaymentsResponse -> Doc #

docList :: [DeleteAllPaymentsResponse] -> Doc #

Out DeleteMacaroonIDRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> DeleteMacaroonIDRequest -> Doc #

doc :: DeleteMacaroonIDRequest -> Doc #

docList :: [DeleteMacaroonIDRequest] -> Doc #

Out DeleteMacaroonIDResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> DeleteMacaroonIDResponse -> Doc #

doc :: DeleteMacaroonIDResponse -> Doc #

docList :: [DeleteMacaroonIDResponse] -> Doc #

Out DeletePaymentRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> DeletePaymentRequest -> Doc #

doc :: DeletePaymentRequest -> Doc #

docList :: [DeletePaymentRequest] -> Doc #

Out DeletePaymentResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> DeletePaymentResponse -> Doc #

doc :: DeletePaymentResponse -> Doc #

docList :: [DeletePaymentResponse] -> Doc #

Out ExportChannelBackupRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> ExportChannelBackupRequest -> Doc #

doc :: ExportChannelBackupRequest -> Doc #

docList :: [ExportChannelBackupRequest] -> Doc #

Out FailedUpdate 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> FailedUpdate -> Doc #

doc :: FailedUpdate -> Doc #

docList :: [FailedUpdate] -> Doc #

Out Failure 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> Failure -> Doc #

doc :: Failure -> Doc #

docList :: [Failure] -> Doc #

Out Failure'FailureCode 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> Failure'FailureCode -> Doc #

doc :: Failure'FailureCode -> Doc #

docList :: [Failure'FailureCode] -> Doc #

Out Failure'FailureCode'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> Failure'FailureCode'UnrecognizedValue -> Doc #

doc :: Failure'FailureCode'UnrecognizedValue -> Doc #

docList :: [Failure'FailureCode'UnrecognizedValue] -> Doc #

Out FeeReportRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> FeeReportRequest -> Doc #

doc :: FeeReportRequest -> Doc #

docList :: [FeeReportRequest] -> Doc #

Out FeeReportResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> FeeReportResponse -> Doc #

doc :: FeeReportResponse -> Doc #

docList :: [FeeReportResponse] -> Doc #

Out ForwardingEvent 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> ForwardingEvent -> Doc #

doc :: ForwardingEvent -> Doc #

docList :: [ForwardingEvent] -> Doc #

Out ForwardingHistoryRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> ForwardingHistoryRequest -> Doc #

doc :: ForwardingHistoryRequest -> Doc #

docList :: [ForwardingHistoryRequest] -> Doc #

Out ForwardingHistoryResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> ForwardingHistoryResponse -> Doc #

doc :: ForwardingHistoryResponse -> Doc #

docList :: [ForwardingHistoryResponse] -> Doc #

Out HTLCAttempt 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> HTLCAttempt -> Doc #

doc :: HTLCAttempt -> Doc #

docList :: [HTLCAttempt] -> Doc #

Out HTLCAttempt'HTLCStatus 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> HTLCAttempt'HTLCStatus -> Doc #

doc :: HTLCAttempt'HTLCStatus -> Doc #

docList :: [HTLCAttempt'HTLCStatus] -> Doc #

Out HTLCAttempt'HTLCStatus'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> HTLCAttempt'HTLCStatus'UnrecognizedValue -> Doc #

doc :: HTLCAttempt'HTLCStatus'UnrecognizedValue -> Doc #

docList :: [HTLCAttempt'HTLCStatus'UnrecognizedValue] -> Doc #

Out InterceptFeedback 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> InterceptFeedback -> Doc #

doc :: InterceptFeedback -> Doc #

docList :: [InterceptFeedback] -> Doc #

Out Invoice 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> Invoice -> Doc #

doc :: Invoice -> Doc #

docList :: [Invoice] -> Doc #

Out Invoice'AmpInvoiceStateEntry 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> Invoice'AmpInvoiceStateEntry -> Doc #

doc :: Invoice'AmpInvoiceStateEntry -> Doc #

docList :: [Invoice'AmpInvoiceStateEntry] -> Doc #

Out Invoice'FeaturesEntry 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> Invoice'FeaturesEntry -> Doc #

doc :: Invoice'FeaturesEntry -> Doc #

docList :: [Invoice'FeaturesEntry] -> Doc #

Out Invoice'InvoiceState 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> Invoice'InvoiceState -> Doc #

doc :: Invoice'InvoiceState -> Doc #

docList :: [Invoice'InvoiceState] -> Doc #

Out Invoice'InvoiceState'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> Invoice'InvoiceState'UnrecognizedValue -> Doc #

doc :: Invoice'InvoiceState'UnrecognizedValue -> Doc #

docList :: [Invoice'InvoiceState'UnrecognizedValue] -> Doc #

Out InvoiceHTLC 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> InvoiceHTLC -> Doc #

doc :: InvoiceHTLC -> Doc #

docList :: [InvoiceHTLC] -> Doc #

Out InvoiceHTLC'CustomRecordsEntry 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> InvoiceHTLC'CustomRecordsEntry -> Doc #

doc :: InvoiceHTLC'CustomRecordsEntry -> Doc #

docList :: [InvoiceHTLC'CustomRecordsEntry] -> Doc #

Out InvoiceHTLCState 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> InvoiceHTLCState -> Doc #

doc :: InvoiceHTLCState -> Doc #

docList :: [InvoiceHTLCState] -> Doc #

Out InvoiceHTLCState'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> InvoiceHTLCState'UnrecognizedValue -> Doc #

doc :: InvoiceHTLCState'UnrecognizedValue -> Doc #

docList :: [InvoiceHTLCState'UnrecognizedValue] -> Doc #

Out InvoiceSubscription 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> InvoiceSubscription -> Doc #

doc :: InvoiceSubscription -> Doc #

docList :: [InvoiceSubscription] -> Doc #

Out ListInvoiceRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> ListInvoiceRequest -> Doc #

doc :: ListInvoiceRequest -> Doc #

docList :: [ListInvoiceRequest] -> Doc #

Out ListInvoiceResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> ListInvoiceResponse -> Doc #

doc :: ListInvoiceResponse -> Doc #

docList :: [ListInvoiceResponse] -> Doc #

Out ListMacaroonIDsRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> ListMacaroonIDsRequest -> Doc #

doc :: ListMacaroonIDsRequest -> Doc #

docList :: [ListMacaroonIDsRequest] -> Doc #

Out ListMacaroonIDsResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> ListMacaroonIDsResponse -> Doc #

doc :: ListMacaroonIDsResponse -> Doc #

docList :: [ListMacaroonIDsResponse] -> Doc #

Out ListPaymentsRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> ListPaymentsRequest -> Doc #

doc :: ListPaymentsRequest -> Doc #

docList :: [ListPaymentsRequest] -> Doc #

Out ListPaymentsResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> ListPaymentsResponse -> Doc #

doc :: ListPaymentsResponse -> Doc #

docList :: [ListPaymentsResponse] -> Doc #

Out ListPermissionsRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> ListPermissionsRequest -> Doc #

doc :: ListPermissionsRequest -> Doc #

docList :: [ListPermissionsRequest] -> Doc #

Out ListPermissionsResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> ListPermissionsResponse -> Doc #

doc :: ListPermissionsResponse -> Doc #

docList :: [ListPermissionsResponse] -> Doc #

Out ListPermissionsResponse'MethodPermissionsEntry 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> ListPermissionsResponse'MethodPermissionsEntry -> Doc #

doc :: ListPermissionsResponse'MethodPermissionsEntry -> Doc #

docList :: [ListPermissionsResponse'MethodPermissionsEntry] -> Doc #

Out MacaroonId 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> MacaroonId -> Doc #

doc :: MacaroonId -> Doc #

docList :: [MacaroonId] -> Doc #

Out MacaroonPermission 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> MacaroonPermission -> Doc #

doc :: MacaroonPermission -> Doc #

docList :: [MacaroonPermission] -> Doc #

Out MacaroonPermissionList 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> MacaroonPermissionList -> Doc #

doc :: MacaroonPermissionList -> Doc #

docList :: [MacaroonPermissionList] -> Doc #

Out MiddlewareRegistration 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> MiddlewareRegistration -> Doc #

doc :: MiddlewareRegistration -> Doc #

docList :: [MiddlewareRegistration] -> Doc #

Out MultiChanBackup 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> MultiChanBackup -> Doc #

doc :: MultiChanBackup -> Doc #

docList :: [MultiChanBackup] -> Doc #

Out Op 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> Op -> Doc #

doc :: Op -> Doc #

docList :: [Op] -> Doc #

Out PayReq 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> PayReq -> Doc #

doc :: PayReq -> Doc #

docList :: [PayReq] -> Doc #

Out PayReq'FeaturesEntry 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> PayReq'FeaturesEntry -> Doc #

doc :: PayReq'FeaturesEntry -> Doc #

docList :: [PayReq'FeaturesEntry] -> Doc #

Out PayReqString 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> PayReqString -> Doc #

doc :: PayReqString -> Doc #

docList :: [PayReqString] -> Doc #

Out Payment 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> Payment -> Doc #

doc :: Payment -> Doc #

docList :: [Payment] -> Doc #

Out Payment'PaymentStatus 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> Payment'PaymentStatus -> Doc #

doc :: Payment'PaymentStatus -> Doc #

docList :: [Payment'PaymentStatus] -> Doc #

Out Payment'PaymentStatus'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> Payment'PaymentStatus'UnrecognizedValue -> Doc #

doc :: Payment'PaymentStatus'UnrecognizedValue -> Doc #

docList :: [Payment'PaymentStatus'UnrecognizedValue] -> Doc #

Out PaymentFailureReason 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> PaymentFailureReason -> Doc #

doc :: PaymentFailureReason -> Doc #

docList :: [PaymentFailureReason] -> Doc #

Out PaymentFailureReason'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> PaymentFailureReason'UnrecognizedValue -> Doc #

doc :: PaymentFailureReason'UnrecognizedValue -> Doc #

docList :: [PaymentFailureReason'UnrecognizedValue] -> Doc #

Out PaymentHash 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> PaymentHash -> Doc #

doc :: PaymentHash -> Doc #

docList :: [PaymentHash] -> Doc #

Out PolicyUpdateRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> PolicyUpdateRequest -> Doc #

doc :: PolicyUpdateRequest -> Doc #

docList :: [PolicyUpdateRequest] -> Doc #

Out PolicyUpdateRequest'Scope 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> PolicyUpdateRequest'Scope -> Doc #

doc :: PolicyUpdateRequest'Scope -> Doc #

docList :: [PolicyUpdateRequest'Scope] -> Doc #

Out PolicyUpdateResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> PolicyUpdateResponse -> Doc #

doc :: PolicyUpdateResponse -> Doc #

docList :: [PolicyUpdateResponse] -> Doc #

Out RPCMessage 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> RPCMessage -> Doc #

doc :: RPCMessage -> Doc #

docList :: [RPCMessage] -> Doc #

Out RPCMiddlewareRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> RPCMiddlewareRequest -> Doc #

doc :: RPCMiddlewareRequest -> Doc #

docList :: [RPCMiddlewareRequest] -> Doc #

Out RPCMiddlewareRequest'InterceptType 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> RPCMiddlewareRequest'InterceptType -> Doc #

doc :: RPCMiddlewareRequest'InterceptType -> Doc #

docList :: [RPCMiddlewareRequest'InterceptType] -> Doc #

Out RPCMiddlewareResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> RPCMiddlewareResponse -> Doc #

doc :: RPCMiddlewareResponse -> Doc #

docList :: [RPCMiddlewareResponse] -> Doc #

Out RPCMiddlewareResponse'MiddlewareMessage 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> RPCMiddlewareResponse'MiddlewareMessage -> Doc #

doc :: RPCMiddlewareResponse'MiddlewareMessage -> Doc #

docList :: [RPCMiddlewareResponse'MiddlewareMessage] -> Doc #

Out RestoreBackupResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> RestoreBackupResponse -> Doc #

doc :: RestoreBackupResponse -> Doc #

docList :: [RestoreBackupResponse] -> Doc #

Out RestoreChanBackupRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> RestoreChanBackupRequest -> Doc #

doc :: RestoreChanBackupRequest -> Doc #

docList :: [RestoreChanBackupRequest] -> Doc #

Out RestoreChanBackupRequest'Backup 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> RestoreChanBackupRequest'Backup -> Doc #

doc :: RestoreChanBackupRequest'Backup -> Doc #

docList :: [RestoreChanBackupRequest'Backup] -> Doc #

Out SetID 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> SetID -> Doc #

doc :: SetID -> Doc #

docList :: [SetID] -> Doc #

Out StreamAuth 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> StreamAuth -> Doc #

doc :: StreamAuth -> Doc #

docList :: [StreamAuth] -> Doc #

Out UpdateFailure 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> UpdateFailure -> Doc #

doc :: UpdateFailure -> Doc #

docList :: [UpdateFailure] -> Doc #

Out UpdateFailure'UnrecognizedValue 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> UpdateFailure'UnrecognizedValue -> Doc #

doc :: UpdateFailure'UnrecognizedValue -> Doc #

docList :: [UpdateFailure'UnrecognizedValue] -> Doc #

Out VerifyChanBackupResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

docPrec :: Int -> VerifyChanBackupResponse -> Doc #

doc :: VerifyChanBackupResponse -> Doc #

docList :: [VerifyChanBackupResponse] -> Doc #

Out BuildRouteRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> BuildRouteRequest -> Doc #

doc :: BuildRouteRequest -> Doc #

docList :: [BuildRouteRequest] -> Doc #

Out BuildRouteResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> BuildRouteResponse -> Doc #

doc :: BuildRouteResponse -> Doc #

docList :: [BuildRouteResponse] -> Doc #

Out ChanStatusAction 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> ChanStatusAction -> Doc #

doc :: ChanStatusAction -> Doc #

docList :: [ChanStatusAction] -> Doc #

Out ChanStatusAction'UnrecognizedValue 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> ChanStatusAction'UnrecognizedValue -> Doc #

doc :: ChanStatusAction'UnrecognizedValue -> Doc #

docList :: [ChanStatusAction'UnrecognizedValue] -> Doc #

Out CircuitKey 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> CircuitKey -> Doc #

doc :: CircuitKey -> Doc #

docList :: [CircuitKey] -> Doc #

Out FailureDetail 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> FailureDetail -> Doc #

doc :: FailureDetail -> Doc #

docList :: [FailureDetail] -> Doc #

Out FailureDetail'UnrecognizedValue 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> FailureDetail'UnrecognizedValue -> Doc #

doc :: FailureDetail'UnrecognizedValue -> Doc #

docList :: [FailureDetail'UnrecognizedValue] -> Doc #

Out ForwardEvent 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> ForwardEvent -> Doc #

doc :: ForwardEvent -> Doc #

docList :: [ForwardEvent] -> Doc #

Out ForwardFailEvent 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> ForwardFailEvent -> Doc #

doc :: ForwardFailEvent -> Doc #

docList :: [ForwardFailEvent] -> Doc #

Out ForwardHtlcInterceptRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> ForwardHtlcInterceptRequest -> Doc #

doc :: ForwardHtlcInterceptRequest -> Doc #

docList :: [ForwardHtlcInterceptRequest] -> Doc #

Out ForwardHtlcInterceptRequest'CustomRecordsEntry 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> ForwardHtlcInterceptRequest'CustomRecordsEntry -> Doc #

doc :: ForwardHtlcInterceptRequest'CustomRecordsEntry -> Doc #

docList :: [ForwardHtlcInterceptRequest'CustomRecordsEntry] -> Doc #

Out ForwardHtlcInterceptResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> ForwardHtlcInterceptResponse -> Doc #

doc :: ForwardHtlcInterceptResponse -> Doc #

docList :: [ForwardHtlcInterceptResponse] -> Doc #

Out GetMissionControlConfigRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> GetMissionControlConfigRequest -> Doc #

doc :: GetMissionControlConfigRequest -> Doc #

docList :: [GetMissionControlConfigRequest] -> Doc #

Out GetMissionControlConfigResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> GetMissionControlConfigResponse -> Doc #

doc :: GetMissionControlConfigResponse -> Doc #

docList :: [GetMissionControlConfigResponse] -> Doc #

Out HtlcEvent 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> HtlcEvent -> Doc #

doc :: HtlcEvent -> Doc #

docList :: [HtlcEvent] -> Doc #

Out HtlcEvent'Event 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> HtlcEvent'Event -> Doc #

doc :: HtlcEvent'Event -> Doc #

docList :: [HtlcEvent'Event] -> Doc #

Out HtlcEvent'EventType 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> HtlcEvent'EventType -> Doc #

doc :: HtlcEvent'EventType -> Doc #

docList :: [HtlcEvent'EventType] -> Doc #

Out HtlcEvent'EventType'UnrecognizedValue 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> HtlcEvent'EventType'UnrecognizedValue -> Doc #

doc :: HtlcEvent'EventType'UnrecognizedValue -> Doc #

docList :: [HtlcEvent'EventType'UnrecognizedValue] -> Doc #

Out HtlcInfo 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> HtlcInfo -> Doc #

doc :: HtlcInfo -> Doc #

docList :: [HtlcInfo] -> Doc #

Out LinkFailEvent 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> LinkFailEvent -> Doc #

doc :: LinkFailEvent -> Doc #

docList :: [LinkFailEvent] -> Doc #

Out MissionControlConfig 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> MissionControlConfig -> Doc #

doc :: MissionControlConfig -> Doc #

docList :: [MissionControlConfig] -> Doc #

Out PairData 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> PairData -> Doc #

doc :: PairData -> Doc #

docList :: [PairData] -> Doc #

Out PairHistory 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> PairHistory -> Doc #

doc :: PairHistory -> Doc #

docList :: [PairHistory] -> Doc #

Out PaymentState 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> PaymentState -> Doc #

doc :: PaymentState -> Doc #

docList :: [PaymentState] -> Doc #

Out PaymentState'UnrecognizedValue 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> PaymentState'UnrecognizedValue -> Doc #

doc :: PaymentState'UnrecognizedValue -> Doc #

docList :: [PaymentState'UnrecognizedValue] -> Doc #

Out PaymentStatus 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> PaymentStatus -> Doc #

doc :: PaymentStatus -> Doc #

docList :: [PaymentStatus] -> Doc #

Out QueryMissionControlRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> QueryMissionControlRequest -> Doc #

doc :: QueryMissionControlRequest -> Doc #

docList :: [QueryMissionControlRequest] -> Doc #

Out QueryMissionControlResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> QueryMissionControlResponse -> Doc #

doc :: QueryMissionControlResponse -> Doc #

docList :: [QueryMissionControlResponse] -> Doc #

Out QueryProbabilityRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> QueryProbabilityRequest -> Doc #

doc :: QueryProbabilityRequest -> Doc #

docList :: [QueryProbabilityRequest] -> Doc #

Out QueryProbabilityResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> QueryProbabilityResponse -> Doc #

doc :: QueryProbabilityResponse -> Doc #

docList :: [QueryProbabilityResponse] -> Doc #

Out ResetMissionControlRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> ResetMissionControlRequest -> Doc #

doc :: ResetMissionControlRequest -> Doc #

docList :: [ResetMissionControlRequest] -> Doc #

Out ResetMissionControlResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> ResetMissionControlResponse -> Doc #

doc :: ResetMissionControlResponse -> Doc #

docList :: [ResetMissionControlResponse] -> Doc #

Out ResolveHoldForwardAction 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> ResolveHoldForwardAction -> Doc #

doc :: ResolveHoldForwardAction -> Doc #

docList :: [ResolveHoldForwardAction] -> Doc #

Out ResolveHoldForwardAction'UnrecognizedValue 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> ResolveHoldForwardAction'UnrecognizedValue -> Doc #

doc :: ResolveHoldForwardAction'UnrecognizedValue -> Doc #

docList :: [ResolveHoldForwardAction'UnrecognizedValue] -> Doc #

Out RouteFeeRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> RouteFeeRequest -> Doc #

doc :: RouteFeeRequest -> Doc #

docList :: [RouteFeeRequest] -> Doc #

Out RouteFeeResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> RouteFeeResponse -> Doc #

doc :: RouteFeeResponse -> Doc #

docList :: [RouteFeeResponse] -> Doc #

Out SendPaymentRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> SendPaymentRequest -> Doc #

doc :: SendPaymentRequest -> Doc #

docList :: [SendPaymentRequest] -> Doc #

Out SendPaymentRequest'DestCustomRecordsEntry 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> SendPaymentRequest'DestCustomRecordsEntry -> Doc #

doc :: SendPaymentRequest'DestCustomRecordsEntry -> Doc #

docList :: [SendPaymentRequest'DestCustomRecordsEntry] -> Doc #

Out SendToRouteRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> SendToRouteRequest -> Doc #

doc :: SendToRouteRequest -> Doc #

docList :: [SendToRouteRequest] -> Doc #

Out SendToRouteResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> SendToRouteResponse -> Doc #

doc :: SendToRouteResponse -> Doc #

docList :: [SendToRouteResponse] -> Doc #

Out SetMissionControlConfigRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> SetMissionControlConfigRequest -> Doc #

doc :: SetMissionControlConfigRequest -> Doc #

docList :: [SetMissionControlConfigRequest] -> Doc #

Out SetMissionControlConfigResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> SetMissionControlConfigResponse -> Doc #

doc :: SetMissionControlConfigResponse -> Doc #

docList :: [SetMissionControlConfigResponse] -> Doc #

Out SettleEvent 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> SettleEvent -> Doc #

doc :: SettleEvent -> Doc #

docList :: [SettleEvent] -> Doc #

Out SubscribeHtlcEventsRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> SubscribeHtlcEventsRequest -> Doc #

doc :: SubscribeHtlcEventsRequest -> Doc #

docList :: [SubscribeHtlcEventsRequest] -> Doc #

Out TrackPaymentRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> TrackPaymentRequest -> Doc #

doc :: TrackPaymentRequest -> Doc #

docList :: [TrackPaymentRequest] -> Doc #

Out UpdateChanStatusRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> UpdateChanStatusRequest -> Doc #

doc :: UpdateChanStatusRequest -> Doc #

docList :: [UpdateChanStatusRequest] -> Doc #

Out UpdateChanStatusResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> UpdateChanStatusResponse -> Doc #

doc :: UpdateChanStatusResponse -> Doc #

docList :: [UpdateChanStatusResponse] -> Doc #

Out XImportMissionControlRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> XImportMissionControlRequest -> Doc #

doc :: XImportMissionControlRequest -> Doc #

docList :: [XImportMissionControlRequest] -> Doc #

Out XImportMissionControlResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

docPrec :: Int -> XImportMissionControlResponse -> Doc #

doc :: XImportMissionControlResponse -> Doc #

docList :: [XImportMissionControlResponse] -> Doc #

Out InputScript 
Instance details

Defined in Proto.Signrpc.Signer

Methods

docPrec :: Int -> InputScript -> Doc #

doc :: InputScript -> Doc #

docList :: [InputScript] -> Doc #

Out InputScriptResp 
Instance details

Defined in Proto.Signrpc.Signer

Methods

docPrec :: Int -> InputScriptResp -> Doc #

doc :: InputScriptResp -> Doc #

docList :: [InputScriptResp] -> Doc #

Out KeyDescriptor 
Instance details

Defined in Proto.Signrpc.Signer

Methods

docPrec :: Int -> KeyDescriptor -> Doc #

doc :: KeyDescriptor -> Doc #

docList :: [KeyDescriptor] -> Doc #

Out KeyLocator 
Instance details

Defined in Proto.Signrpc.Signer

Methods

docPrec :: Int -> KeyLocator -> Doc #

doc :: KeyLocator -> Doc #

docList :: [KeyLocator] -> Doc #

Out SharedKeyRequest 
Instance details

Defined in Proto.Signrpc.Signer

Methods

docPrec :: Int -> SharedKeyRequest -> Doc #

doc :: SharedKeyRequest -> Doc #

docList :: [SharedKeyRequest] -> Doc #

Out SharedKeyResponse 
Instance details

Defined in Proto.Signrpc.Signer

Methods

docPrec :: Int -> SharedKeyResponse -> Doc #

doc :: SharedKeyResponse -> Doc #

docList :: [SharedKeyResponse] -> Doc #

Out SignDescriptor 
Instance details

Defined in Proto.Signrpc.Signer

Methods

docPrec :: Int -> SignDescriptor -> Doc #

doc :: SignDescriptor -> Doc #

docList :: [SignDescriptor] -> Doc #

Out SignMessageReq 
Instance details

Defined in Proto.Signrpc.Signer

Methods

docPrec :: Int -> SignMessageReq -> Doc #

doc :: SignMessageReq -> Doc #

docList :: [SignMessageReq] -> Doc #

Out SignMessageResp 
Instance details

Defined in Proto.Signrpc.Signer

Methods

docPrec :: Int -> SignMessageResp -> Doc #

doc :: SignMessageResp -> Doc #

docList :: [SignMessageResp] -> Doc #

Out SignReq 
Instance details

Defined in Proto.Signrpc.Signer

Methods

docPrec :: Int -> SignReq -> Doc #

doc :: SignReq -> Doc #

docList :: [SignReq] -> Doc #

Out SignResp 
Instance details

Defined in Proto.Signrpc.Signer

Methods

docPrec :: Int -> SignResp -> Doc #

doc :: SignResp -> Doc #

docList :: [SignResp] -> Doc #

Out TxOut 
Instance details

Defined in Proto.Signrpc.Signer

Methods

docPrec :: Int -> TxOut -> Doc #

doc :: TxOut -> Doc #

docList :: [TxOut] -> Doc #

Out VerifyMessageReq 
Instance details

Defined in Proto.Signrpc.Signer

Methods

docPrec :: Int -> VerifyMessageReq -> Doc #

doc :: VerifyMessageReq -> Doc #

docList :: [VerifyMessageReq] -> Doc #

Out VerifyMessageResp 
Instance details

Defined in Proto.Signrpc.Signer

Methods

docPrec :: Int -> VerifyMessageResp -> Doc #

doc :: VerifyMessageResp -> Doc #

docList :: [VerifyMessageResp] -> Doc #

Out Account 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> Account -> Doc #

doc :: Account -> Doc #

docList :: [Account] -> Doc #

Out AddrRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> AddrRequest -> Doc #

doc :: AddrRequest -> Doc #

docList :: [AddrRequest] -> Doc #

Out AddrResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> AddrResponse -> Doc #

doc :: AddrResponse -> Doc #

docList :: [AddrResponse] -> Doc #

Out AddressType 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> AddressType -> Doc #

doc :: AddressType -> Doc #

docList :: [AddressType] -> Doc #

Out AddressType'UnrecognizedValue 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> AddressType'UnrecognizedValue -> Doc #

doc :: AddressType'UnrecognizedValue -> Doc #

docList :: [AddressType'UnrecognizedValue] -> Doc #

Out BumpFeeRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> BumpFeeRequest -> Doc #

doc :: BumpFeeRequest -> Doc #

docList :: [BumpFeeRequest] -> Doc #

Out BumpFeeResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> BumpFeeResponse -> Doc #

doc :: BumpFeeResponse -> Doc #

docList :: [BumpFeeResponse] -> Doc #

Out EstimateFeeRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> EstimateFeeRequest -> Doc #

doc :: EstimateFeeRequest -> Doc #

docList :: [EstimateFeeRequest] -> Doc #

Out EstimateFeeResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> EstimateFeeResponse -> Doc #

doc :: EstimateFeeResponse -> Doc #

docList :: [EstimateFeeResponse] -> Doc #

Out FinalizePsbtRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> FinalizePsbtRequest -> Doc #

doc :: FinalizePsbtRequest -> Doc #

docList :: [FinalizePsbtRequest] -> Doc #

Out FinalizePsbtResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> FinalizePsbtResponse -> Doc #

doc :: FinalizePsbtResponse -> Doc #

docList :: [FinalizePsbtResponse] -> Doc #

Out FundPsbtRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> FundPsbtRequest -> Doc #

doc :: FundPsbtRequest -> Doc #

docList :: [FundPsbtRequest] -> Doc #

Out FundPsbtRequest'Fees 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> FundPsbtRequest'Fees -> Doc #

doc :: FundPsbtRequest'Fees -> Doc #

docList :: [FundPsbtRequest'Fees] -> Doc #

Out FundPsbtRequest'Template 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> FundPsbtRequest'Template -> Doc #

doc :: FundPsbtRequest'Template -> Doc #

docList :: [FundPsbtRequest'Template] -> Doc #

Out FundPsbtResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> FundPsbtResponse -> Doc #

doc :: FundPsbtResponse -> Doc #

docList :: [FundPsbtResponse] -> Doc #

Out ImportAccountRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> ImportAccountRequest -> Doc #

doc :: ImportAccountRequest -> Doc #

docList :: [ImportAccountRequest] -> Doc #

Out ImportAccountResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> ImportAccountResponse -> Doc #

doc :: ImportAccountResponse -> Doc #

docList :: [ImportAccountResponse] -> Doc #

Out ImportPublicKeyRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> ImportPublicKeyRequest -> Doc #

doc :: ImportPublicKeyRequest -> Doc #

docList :: [ImportPublicKeyRequest] -> Doc #

Out ImportPublicKeyResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> ImportPublicKeyResponse -> Doc #

doc :: ImportPublicKeyResponse -> Doc #

docList :: [ImportPublicKeyResponse] -> Doc #

Out KeyReq 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> KeyReq -> Doc #

doc :: KeyReq -> Doc #

docList :: [KeyReq] -> Doc #

Out LabelTransactionRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> LabelTransactionRequest -> Doc #

doc :: LabelTransactionRequest -> Doc #

docList :: [LabelTransactionRequest] -> Doc #

Out LabelTransactionResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> LabelTransactionResponse -> Doc #

doc :: LabelTransactionResponse -> Doc #

docList :: [LabelTransactionResponse] -> Doc #

Out LeaseOutputRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> LeaseOutputRequest -> Doc #

doc :: LeaseOutputRequest -> Doc #

docList :: [LeaseOutputRequest] -> Doc #

Out LeaseOutputResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> LeaseOutputResponse -> Doc #

doc :: LeaseOutputResponse -> Doc #

docList :: [LeaseOutputResponse] -> Doc #

Out ListAccountsRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> ListAccountsRequest -> Doc #

doc :: ListAccountsRequest -> Doc #

docList :: [ListAccountsRequest] -> Doc #

Out ListAccountsResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> ListAccountsResponse -> Doc #

doc :: ListAccountsResponse -> Doc #

docList :: [ListAccountsResponse] -> Doc #

Out ListLeasesRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> ListLeasesRequest -> Doc #

doc :: ListLeasesRequest -> Doc #

docList :: [ListLeasesRequest] -> Doc #

Out ListLeasesResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> ListLeasesResponse -> Doc #

doc :: ListLeasesResponse -> Doc #

docList :: [ListLeasesResponse] -> Doc #

Out ListSweepsRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> ListSweepsRequest -> Doc #

doc :: ListSweepsRequest -> Doc #

docList :: [ListSweepsRequest] -> Doc #

Out ListSweepsResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> ListSweepsResponse -> Doc #

doc :: ListSweepsResponse -> Doc #

docList :: [ListSweepsResponse] -> Doc #

Out ListSweepsResponse'Sweeps 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> ListSweepsResponse'Sweeps -> Doc #

doc :: ListSweepsResponse'Sweeps -> Doc #

docList :: [ListSweepsResponse'Sweeps] -> Doc #

Out ListSweepsResponse'TransactionIDs 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> ListSweepsResponse'TransactionIDs -> Doc #

doc :: ListSweepsResponse'TransactionIDs -> Doc #

docList :: [ListSweepsResponse'TransactionIDs] -> Doc #

Out ListUnspentRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> ListUnspentRequest -> Doc #

doc :: ListUnspentRequest -> Doc #

docList :: [ListUnspentRequest] -> Doc #

Out ListUnspentResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> ListUnspentResponse -> Doc #

doc :: ListUnspentResponse -> Doc #

docList :: [ListUnspentResponse] -> Doc #

Out PendingSweep 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> PendingSweep -> Doc #

doc :: PendingSweep -> Doc #

docList :: [PendingSweep] -> Doc #

Out PendingSweepsRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> PendingSweepsRequest -> Doc #

doc :: PendingSweepsRequest -> Doc #

docList :: [PendingSweepsRequest] -> Doc #

Out PendingSweepsResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> PendingSweepsResponse -> Doc #

doc :: PendingSweepsResponse -> Doc #

docList :: [PendingSweepsResponse] -> Doc #

Out PublishResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> PublishResponse -> Doc #

doc :: PublishResponse -> Doc #

docList :: [PublishResponse] -> Doc #

Out ReleaseOutputRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> ReleaseOutputRequest -> Doc #

doc :: ReleaseOutputRequest -> Doc #

docList :: [ReleaseOutputRequest] -> Doc #

Out ReleaseOutputResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> ReleaseOutputResponse -> Doc #

doc :: ReleaseOutputResponse -> Doc #

docList :: [ReleaseOutputResponse] -> Doc #

Out SendOutputsRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> SendOutputsRequest -> Doc #

doc :: SendOutputsRequest -> Doc #

docList :: [SendOutputsRequest] -> Doc #

Out SendOutputsResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> SendOutputsResponse -> Doc #

doc :: SendOutputsResponse -> Doc #

docList :: [SendOutputsResponse] -> Doc #

Out Transaction 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> Transaction -> Doc #

doc :: Transaction -> Doc #

docList :: [Transaction] -> Doc #

Out TxTemplate 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> TxTemplate -> Doc #

doc :: TxTemplate -> Doc #

docList :: [TxTemplate] -> Doc #

Out TxTemplate'OutputsEntry 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> TxTemplate'OutputsEntry -> Doc #

doc :: TxTemplate'OutputsEntry -> Doc #

docList :: [TxTemplate'OutputsEntry] -> Doc #

Out UtxoLease 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> UtxoLease -> Doc #

doc :: UtxoLease -> Doc #

docList :: [UtxoLease] -> Doc #

Out WitnessType 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> WitnessType -> Doc #

doc :: WitnessType -> Doc #

docList :: [WitnessType] -> Doc #

Out WitnessType'UnrecognizedValue 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

docPrec :: Int -> WitnessType'UnrecognizedValue -> Doc #

doc :: WitnessType'UnrecognizedValue -> Doc #

docList :: [WitnessType'UnrecognizedValue] -> Doc #

Out ChangePasswordRequest 
Instance details

Defined in Proto.Walletunlocker

Methods

docPrec :: Int -> ChangePasswordRequest -> Doc #

doc :: ChangePasswordRequest -> Doc #

docList :: [ChangePasswordRequest] -> Doc #

Out ChangePasswordResponse 
Instance details

Defined in Proto.Walletunlocker

Methods

docPrec :: Int -> ChangePasswordResponse -> Doc #

doc :: ChangePasswordResponse -> Doc #

docList :: [ChangePasswordResponse] -> Doc #

Out GenSeedRequest 
Instance details

Defined in Proto.Walletunlocker

Methods

docPrec :: Int -> GenSeedRequest -> Doc #

doc :: GenSeedRequest -> Doc #

docList :: [GenSeedRequest] -> Doc #

Out GenSeedResponse 
Instance details

Defined in Proto.Walletunlocker

Methods

docPrec :: Int -> GenSeedResponse -> Doc #

doc :: GenSeedResponse -> Doc #

docList :: [GenSeedResponse] -> Doc #

Out InitWalletRequest 
Instance details

Defined in Proto.Walletunlocker

Methods

docPrec :: Int -> InitWalletRequest -> Doc #

doc :: InitWalletRequest -> Doc #

docList :: [InitWalletRequest] -> Doc #

Out InitWalletResponse 
Instance details

Defined in Proto.Walletunlocker

Methods

docPrec :: Int -> InitWalletResponse -> Doc #

doc :: InitWalletResponse -> Doc #

docList :: [InitWalletResponse] -> Doc #

Out UnlockWalletRequest 
Instance details

Defined in Proto.Walletunlocker

Methods

docPrec :: Int -> UnlockWalletRequest -> Doc #

doc :: UnlockWalletRequest -> Doc #

docList :: [UnlockWalletRequest] -> Doc #

Out UnlockWalletResponse 
Instance details

Defined in Proto.Walletunlocker

Methods

docPrec :: Int -> UnlockWalletResponse -> Doc #

doc :: UnlockWalletResponse -> Doc #

docList :: [UnlockWalletResponse] -> Doc #

Out WatchOnly 
Instance details

Defined in Proto.Walletunlocker

Methods

docPrec :: Int -> WatchOnly -> Doc #

doc :: WatchOnly -> Doc #

docList :: [WatchOnly] -> Doc #

Out WatchOnlyAccount 
Instance details

Defined in Proto.Walletunlocker

Methods

docPrec :: Int -> WatchOnlyAccount -> Doc #

doc :: WatchOnlyAccount -> Doc #

docList :: [WatchOnlyAccount] -> Doc #

Out PortNumber Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Out Block Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Methods

docPrec :: Int -> Block -> Doc #

doc :: Block -> Doc #

docList :: [Block] -> Doc #

Out BlockChainInfo Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Methods

docPrec :: Int -> BlockChainInfo -> Doc #

doc :: BlockChainInfo -> Doc #

docList :: [BlockChainInfo] -> Doc #

Out BlockVerbose Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Methods

docPrec :: Int -> BlockVerbose -> Doc #

doc :: BlockVerbose -> Doc #

docList :: [BlockVerbose] -> Doc #

Out DecodedRawTransaction Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Methods

docPrec :: Int -> DecodedRawTransaction -> Doc #

doc :: DecodedRawTransaction -> Doc #

docList :: [DecodedRawTransaction] -> Doc #

Out ScriptPubKey Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Methods

docPrec :: Int -> ScriptPubKey -> Doc #

doc :: ScriptPubKey -> Doc #

docList :: [ScriptPubKey] -> Doc #

Out ScriptSig Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Methods

docPrec :: Int -> ScriptSig -> Doc #

doc :: ScriptSig -> Doc #

docList :: [ScriptSig] -> Doc #

Out TxIn Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Methods

docPrec :: Int -> TxIn -> Doc #

doc :: TxIn -> Doc #

docList :: [TxIn] -> Doc #

Out TxOut Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Methods

docPrec :: Int -> TxOut -> Doc #

doc :: TxOut -> Doc #

docList :: [TxOut] -> Doc #

Out TxnOutputType Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Methods

docPrec :: Int -> TxnOutputType -> Doc #

doc :: TxnOutputType -> Doc #

docList :: [TxnOutputType] -> Doc #

Out TransactionID Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Methods

docPrec :: Int -> TransactionID -> Doc #

doc :: TransactionID -> Doc #

docList :: [TransactionID] -> Doc #

Out Integer 
Instance details

Defined in Text.PrettyPrint.GenericPretty

Methods

docPrec :: Int -> Integer -> Doc #

doc :: Integer -> Doc #

docList :: [Integer] -> Doc #

Out Natural Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Methods

docPrec :: Int -> Natural -> Doc #

doc :: Natural -> Doc #

docList :: [Natural] -> Doc #

Out () 
Instance details

Defined in Text.PrettyPrint.GenericPretty

Methods

docPrec :: Int -> () -> Doc #

doc :: () -> Doc #

docList :: [()] -> Doc #

Out Bool 
Instance details

Defined in Text.PrettyPrint.GenericPretty

Methods

docPrec :: Int -> Bool -> Doc #

doc :: Bool -> Doc #

docList :: [Bool] -> Doc #

Out Char 
Instance details

Defined in Text.PrettyPrint.GenericPretty

Methods

docPrec :: Int -> Char -> Doc #

doc :: Char -> Doc #

docList :: [Char] -> Doc #

Out Double 
Instance details

Defined in Text.PrettyPrint.GenericPretty

Methods

docPrec :: Int -> Double -> Doc #

doc :: Double -> Doc #

docList :: [Double] -> Doc #

Out Float 
Instance details

Defined in Text.PrettyPrint.GenericPretty

Methods

docPrec :: Int -> Float -> Doc #

doc :: Float -> Doc #

docList :: [Float] -> Doc #

Out Int 
Instance details

Defined in Text.PrettyPrint.GenericPretty

Methods

docPrec :: Int -> Int -> Doc #

doc :: Int -> Doc #

docList :: [Int] -> Doc #

Out (Ratio Natural) Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Out (OnChainAddress mrel) Source # 
Instance details

Defined in BtcLsp.Data.Smart

Methods

docPrec :: Int -> OnChainAddress mrel -> Doc #

doc :: OnChainAddress mrel -> Doc #

docList :: [OnChainAddress mrel] -> Doc #

Out (Liquidity dir) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

docPrec :: Int -> Liquidity dir -> Doc #

doc :: Liquidity dir -> Doc #

docList :: [Liquidity dir] -> Doc #

Out (LnInvoice mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

docPrec :: Int -> LnInvoice mrel -> Doc #

doc :: LnInvoice mrel -> Doc #

docList :: [LnInvoice mrel] -> Doc #

Out (UnsafeOnChainAddress mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Out (Uuid tab) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

docPrec :: Int -> Uuid tab -> Doc #

doc :: Uuid tab -> Doc #

docList :: [Uuid tab] -> Doc #

Out a => Out (PrettyLog a) 
Instance details

Defined in Text.PrettyPrint.GenericPretty.Type

Methods

docPrec :: Int -> PrettyLog a -> Doc #

doc :: PrettyLog a -> Doc #

docList :: [PrettyLog a] -> Doc #

Out (PendingUpdate a) 
Instance details

Defined in LndClient.Data.Channel

Methods

docPrec :: Int -> PendingUpdate a -> Doc #

doc :: PendingUpdate a -> Doc #

docList :: [PendingUpdate a] -> Doc #

Out (TxId a) 
Instance details

Defined in LndClient.Data.Newtype

Methods

docPrec :: Int -> TxId a -> Doc #

doc :: TxId a -> Doc #

docList :: [TxId a] -> Doc #

Out (Vout a) 
Instance details

Defined in LndClient.Data.Newtype

Methods

docPrec :: Int -> Vout a -> Doc #

doc :: Vout a -> Doc #

docList :: [Vout a] -> Doc #

Out (Key Block) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Methods

docPrec :: Int -> Key Block -> Doc #

doc :: Key Block -> Doc #

docList :: [Key Block] -> Doc #

Out (Key LnChan) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Methods

docPrec :: Int -> Key LnChan -> Doc #

doc :: Key LnChan -> Doc #

docList :: [Key LnChan] -> Doc #

Out (Key SwapIntoLn) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Out (Key SwapUtxo) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Out (Key User) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Methods

docPrec :: Int -> Key User -> Doc #

doc :: Key User -> Doc #

docList :: [Key User] -> Doc #

Out (BackendKey SqlBackend) Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Out a => Out (Maybe a) 
Instance details

Defined in Text.PrettyPrint.GenericPretty

Methods

docPrec :: Int -> Maybe a -> Doc #

doc :: Maybe a -> Doc #

docList :: [Maybe a] -> Doc #

Out a => Out [a] 
Instance details

Defined in Text.PrettyPrint.GenericPretty

Methods

docPrec :: Int -> [a] -> Doc #

doc :: [a] -> Doc #

docList :: [[a]] -> Doc #

(Out a, Out b) => Out (Either a b) 
Instance details

Defined in Text.PrettyPrint.GenericPretty

Methods

docPrec :: Int -> Either a b -> Doc #

doc :: Either a b -> Doc #

docList :: [Either a b] -> Doc #

(Out a, Out b) => Out (a, b) 
Instance details

Defined in Text.PrettyPrint.GenericPretty

Methods

docPrec :: Int -> (a, b) -> Doc #

doc :: (a, b) -> Doc #

docList :: [(a, b)] -> Doc #

Out (Money owner btcl mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

docPrec :: Int -> Money owner btcl mrel -> Doc #

doc :: Money owner btcl mrel -> Doc #

docList :: [Money owner btcl mrel] -> Doc #

(Out a, Out b, Out c) => Out (a, b, c) 
Instance details

Defined in Text.PrettyPrint.GenericPretty

Methods

docPrec :: Int -> (a, b, c) -> Doc #

doc :: (a, b, c) -> Doc #

docList :: [(a, b, c)] -> Doc #

(Out a, Out b, Out c, Out d) => Out (a, b, c, d) 
Instance details

Defined in Text.PrettyPrint.GenericPretty

Methods

docPrec :: Int -> (a, b, c, d) -> Doc #

doc :: (a, b, c, d) -> Doc #

docList :: [(a, b, c, d)] -> Doc #

(Out a, Out b, Out c, Out d, Out e) => Out (a, b, c, d, e) 
Instance details

Defined in Text.PrettyPrint.GenericPretty

Methods

docPrec :: Int -> (a, b, c, d, e) -> Doc #

doc :: (a, b, c, d, e) -> Doc #

docList :: [(a, b, c, d, e)] -> Doc #

(Out a, Out b, Out c, Out d, Out e, Out f) => Out (a, b, c, d, e, f) 
Instance details

Defined in Text.PrettyPrint.GenericPretty

Methods

docPrec :: Int -> (a, b, c, d, e, f) -> Doc #

doc :: (a, b, c, d, e, f) -> Doc #

docList :: [(a, b, c, d, e, f)] -> Doc #

(Out a, Out b, Out c, Out d, Out e, Out f, Out g) => Out (a, b, c, d, e, f, g) 
Instance details

Defined in Text.PrettyPrint.GenericPretty

Methods

docPrec :: Int -> (a, b, c, d, e, f, g) -> Doc #

doc :: (a, b, c, d, e, f, g) -> Doc #

docList :: [(a, b, c, d, e, f, g)] -> Doc #

data ByteString #

A space-efficient representation of a Word8 vector, supporting many efficient operations.

A ByteString contains 8-bit bytes, or by using the operations from Data.ByteString.Char8 it can be interpreted as containing 8-bit characters.

Instances

Instances details
Chunk ByteString 
Instance details

Defined in Data.Attoparsec.Internal.Types

Associated Types

type ChunkElem ByteString #

Data ByteString 
Instance details

Defined in Data.ByteString.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ByteString -> c ByteString #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ByteString #

toConstr :: ByteString -> Constr #

dataTypeOf :: ByteString -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ByteString) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ByteString) #

gmapT :: (forall b. Data b => b -> b) -> ByteString -> ByteString #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ByteString -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ByteString -> r #

gmapQ :: (forall d. Data d => d -> u) -> ByteString -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ByteString -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ByteString -> m ByteString #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ByteString -> m ByteString #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ByteString -> m ByteString #

IsString ByteString

Beware: fromString truncates multi-byte characters to octets. e.g. "枯朶に烏のとまりけり秋の暮" becomes �6k�nh~�Q��n�

Instance details

Defined in Data.ByteString.Internal

Monoid ByteString 
Instance details

Defined in Data.ByteString.Internal

Semigroup ByteString 
Instance details

Defined in Data.ByteString.Internal

IsList ByteString

Since: bytestring-0.10.12.0

Instance details

Defined in Data.ByteString.Internal

Associated Types

type Item ByteString #

Read ByteString 
Instance details

Defined in Data.ByteString.Internal

Show ByteString 
Instance details

Defined in Data.ByteString.Internal

FoldCase ByteString

Note that foldCase on ByteStrings is only guaranteed to be correct for ISO-8859-1 encoded strings!

Instance details

Defined in Data.CaseInsensitive.Internal

NFData ByteString 
Instance details

Defined in Data.ByteString.Internal

Methods

rnf :: ByteString -> () #

SqlString ByteString

Since: esqueleto-2.3.0

Instance details

Defined in Database.Esqueleto.Internal.Internal

ToLogStr ByteString 
Instance details

Defined in System.Log.FastLogger.LogStr

Eq ByteString 
Instance details

Defined in Data.ByteString.Internal

Ord ByteString 
Instance details

Defined in Data.ByteString.Internal

Hashable ByteString 
Instance details

Defined in Data.Hashable.Class

QueryKeyLike ByteString 
Instance details

Defined in Network.HTTP.Types.QueryLike

QueryValueLike ByteString 
Instance details

Defined in Network.HTTP.Types.QueryLike

ByteArray ByteString 
Instance details

Defined in Data.ByteArray.Types

Methods

allocRet :: Int -> (Ptr p -> IO a) -> IO (a, ByteString) #

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 () #

MonoZip ByteString 
Instance details

Defined in Data.Containers

GrowingAppend ByteString 
Instance details

Defined in Data.MonoTraversable

MonoFoldable ByteString 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element ByteString -> m) -> ByteString -> m #

ofoldr :: (Element ByteString -> b -> b) -> b -> ByteString -> b #

ofoldl' :: (a -> Element ByteString -> a) -> a -> ByteString -> a #

otoList :: ByteString -> [Element ByteString] #

oall :: (Element ByteString -> Bool) -> ByteString -> Bool #

oany :: (Element ByteString -> Bool) -> ByteString -> Bool #

onull :: ByteString -> Bool #

olength :: ByteString -> Int #

olength64 :: ByteString -> Int64 #

ocompareLength :: Integral i => ByteString -> i -> Ordering #

otraverse_ :: Applicative f => (Element ByteString -> f b) -> ByteString -> f () #

ofor_ :: Applicative f => ByteString -> (Element ByteString -> f b) -> f () #

omapM_ :: Applicative m => (Element ByteString -> m ()) -> ByteString -> m () #

oforM_ :: Applicative m => ByteString -> (Element ByteString -> m ()) -> m () #

ofoldlM :: Monad m => (a -> Element ByteString -> m a) -> a -> ByteString -> m a #

ofoldMap1Ex :: Semigroup m => (Element ByteString -> m) -> ByteString -> m #

ofoldr1Ex :: (Element ByteString -> Element ByteString -> Element ByteString) -> ByteString -> Element ByteString #

ofoldl1Ex' :: (Element ByteString -> Element ByteString -> Element ByteString) -> ByteString -> Element ByteString #

headEx :: ByteString -> Element ByteString #

lastEx :: ByteString -> Element ByteString #

unsafeHead :: ByteString -> Element ByteString #

unsafeLast :: ByteString -> Element ByteString #

maximumByEx :: (Element ByteString -> Element ByteString -> Ordering) -> ByteString -> Element ByteString #

minimumByEx :: (Element ByteString -> Element ByteString -> Ordering) -> ByteString -> Element ByteString #

oelem :: Element ByteString -> ByteString -> Bool #

onotElem :: Element ByteString -> ByteString -> Bool #

MonoFunctor ByteString 
Instance details

Defined in Data.MonoTraversable

MonoPointed ByteString 
Instance details

Defined in Data.MonoTraversable

MonoTraversable ByteString 
Instance details

Defined in Data.MonoTraversable

IsSequence ByteString 
Instance details

Defined in Data.Sequences

Methods

fromList :: [Element ByteString] -> ByteString #

lengthIndex :: ByteString -> Index ByteString #

break :: (Element ByteString -> Bool) -> ByteString -> (ByteString, ByteString) #

span :: (Element ByteString -> Bool) -> ByteString -> (ByteString, ByteString) #

dropWhile :: (Element ByteString -> Bool) -> ByteString -> ByteString #

takeWhile :: (Element ByteString -> Bool) -> ByteString -> ByteString #

splitAt :: Index ByteString -> ByteString -> (ByteString, ByteString) #

unsafeSplitAt :: Index ByteString -> ByteString -> (ByteString, ByteString) #

take :: Index ByteString -> ByteString -> ByteString #

unsafeTake :: Index ByteString -> ByteString -> ByteString #

drop :: Index ByteString -> ByteString -> ByteString #

unsafeDrop :: Index ByteString -> ByteString -> ByteString #

dropEnd :: Index ByteString -> ByteString -> ByteString #

partition :: (Element ByteString -> Bool) -> ByteString -> (ByteString, ByteString) #

uncons :: ByteString -> Maybe (Element ByteString, ByteString) #

unsnoc :: ByteString -> Maybe (ByteString, Element ByteString) #

filter :: (Element ByteString -> Bool) -> ByteString -> ByteString #

filterM :: Monad m => (Element ByteString -> m Bool) -> ByteString -> m ByteString #

replicate :: Index ByteString -> Element ByteString -> ByteString #

replicateM :: Monad m => Index ByteString -> m (Element ByteString) -> m ByteString #

groupBy :: (Element ByteString -> Element ByteString -> Bool) -> ByteString -> [ByteString] #

groupAllOn :: Eq b => (Element ByteString -> b) -> ByteString -> [ByteString] #

subsequences :: ByteString -> [ByteString] #

permutations :: ByteString -> [ByteString] #

tailEx :: ByteString -> ByteString #

tailMay :: ByteString -> Maybe ByteString #

initEx :: ByteString -> ByteString #

initMay :: ByteString -> Maybe ByteString #

unsafeTail :: ByteString -> ByteString #

unsafeInit :: ByteString -> ByteString #

index :: ByteString -> Index ByteString -> Maybe (Element ByteString) #

indexEx :: ByteString -> Index ByteString -> Element ByteString #

unsafeIndex :: ByteString -> Index ByteString -> Element ByteString #

splitWhen :: (Element ByteString -> Bool) -> ByteString -> [ByteString] #

SemiSequence ByteString 
Instance details

Defined in Data.Sequences

Associated Types

type Index ByteString #

PersistField ByteString 
Instance details

Defined in Database.Persist.Class.PersistField

PersistFieldSql ByteString 
Instance details

Defined in Database.Persist.Sql.Class

FieldDefault ByteString 
Instance details

Defined in Data.ProtoLens.Message

ToBinary ByteString 
Instance details

Defined in Codec.QRCode.Data.ToInput

Methods

toBinary :: ByteString -> [Word8] #

Container ByteString 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element ByteString #

FromList ByteString 
Instance details

Defined in Universum.Container.Class

Associated Types

type ListElement ByteString #

type FromListC ByteString #

One ByteString 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem ByteString #

Print ByteString 
Instance details

Defined in Universum.Print.Internal

Methods

hPutStr :: Handle -> ByteString -> IO () #

hPutStrLn :: Handle -> ByteString -> IO () #

ToContent ByteString 
Instance details

Defined in Yesod.Core.Content

ToFlushBuilder ByteString 
Instance details

Defined in Yesod.Core.Content

BinaryParam ByteString TiffInfo 
Instance details

Defined in Codec.Picture.Tiff

Methods

getP :: ByteString -> Get TiffInfo #

putP :: ByteString -> TiffInfo -> Put #

ToBuilder ByteString Builder 
Instance details

Defined in Data.Builder

FromGrpc SingleChanBackupBlob ByteString 
Instance details

Defined in LndClient.Data.ChannelBackup

Methods

fromGrpc :: ByteString -> Either LndError SingleChanBackupBlob

FromGrpc NodePubKey ByteString 
Instance details

Defined in LndClient.Data.Newtype

FromGrpc Psbt ByteString 
Instance details

Defined in LndClient.Data.Newtype

FromGrpc RHash ByteString 
Instance details

Defined in LndClient.Data.Newtype

FromGrpc RPreimage ByteString 
Instance details

Defined in LndClient.Data.Newtype

ToGrpc SingleChanBackupBlob ByteString 
Instance details

Defined in LndClient.Data.ChannelBackup

Methods

toGrpc :: SingleChanBackupBlob -> Either LndError ByteString

ToGrpc LndWalletPassword ByteString 
Instance details

Defined in LndClient.Data.LndEnv

Methods

toGrpc :: LndWalletPassword -> Either LndError ByteString

ToGrpc AezeedPassphrase ByteString 
Instance details

Defined in LndClient.Data.Newtype

Methods

toGrpc :: AezeedPassphrase -> Either LndError ByteString

ToGrpc NodePubKey ByteString 
Instance details

Defined in LndClient.Data.Newtype

ToGrpc PendingChannelId ByteString 
Instance details

Defined in LndClient.Data.Newtype

Methods

toGrpc :: PendingChannelId -> Either LndError ByteString

ToGrpc Psbt ByteString 
Instance details

Defined in LndClient.Data.Newtype

Methods

toGrpc :: Psbt -> Either LndError ByteString

ToGrpc RHash ByteString 
Instance details

Defined in LndClient.Data.Newtype

ToGrpc RPreimage ByteString 
Instance details

Defined in LndClient.Data.Newtype

ToGrpc RawTx ByteString 
Instance details

Defined in LndClient.Data.Newtype

Methods

toGrpc :: RawTx -> Either LndError ByteString

LazySequence ByteString ByteString 
Instance details

Defined in Data.Sequences

Utf8 Text ByteString 
Instance details

Defined in Data.Sequences

StringConv ByteString ByteString 
Instance details

Defined in Data.String.Conv

StringConv ByteString ByteString 
Instance details

Defined in Data.String.Conv

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 ByteString String 
Instance details

Defined in Data.String.Conv

StringConv ByteString ByteString 
Instance details

Defined in Data.String.Conv

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 String ByteString 
Instance details

Defined in Data.String.Conv

ConvertUtf8 Text ByteString 
Instance details

Defined in Universum.String.Conversion

ConvertUtf8 Text ByteString 
Instance details

Defined in Universum.String.Conversion

ConvertUtf8 String ByteString 
Instance details

Defined in Universum.String.Conversion

From SigHeaderName ByteString Source # 
Instance details

Defined in BtcLsp.Grpc.Data

TryFrom ByteString SigHeaderName Source # 
Instance details

Defined in BtcLsp.Grpc.Data

HasField LnPubKey "val" ByteString 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

fieldOf :: Functor f => Proxy# "val" -> (ByteString -> f ByteString) -> LnPubKey -> f LnPubKey

HasField AddHoldInvoiceRequest "descriptionHash" ByteString 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

fieldOf :: Functor f => Proxy# "descriptionHash" -> (ByteString -> f ByteString) -> AddHoldInvoiceRequest -> f AddHoldInvoiceRequest

HasField AddHoldInvoiceRequest "hash" ByteString 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

fieldOf :: Functor f => Proxy# "hash" -> (ByteString -> f ByteString) -> AddHoldInvoiceRequest -> f AddHoldInvoiceRequest

HasField AddHoldInvoiceResp "paymentAddr" ByteString 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

fieldOf :: Functor f => Proxy# "paymentAddr" -> (ByteString -> f ByteString) -> AddHoldInvoiceResp -> f AddHoldInvoiceResp

HasField CancelInvoiceMsg "paymentHash" ByteString 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

fieldOf :: Functor f => Proxy# "paymentHash" -> (ByteString -> f ByteString) -> CancelInvoiceMsg -> f CancelInvoiceMsg

HasField LookupInvoiceMsg "paymentAddr" ByteString 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

fieldOf :: Functor f => Proxy# "paymentAddr" -> (ByteString -> f ByteString) -> LookupInvoiceMsg -> f LookupInvoiceMsg

HasField LookupInvoiceMsg "paymentHash" ByteString 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

fieldOf :: Functor f => Proxy# "paymentHash" -> (ByteString -> f ByteString) -> LookupInvoiceMsg -> f LookupInvoiceMsg

HasField LookupInvoiceMsg "setId" ByteString 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

fieldOf :: Functor f => Proxy# "setId" -> (ByteString -> f ByteString) -> LookupInvoiceMsg -> f LookupInvoiceMsg

HasField SettleInvoiceMsg "preimage" ByteString 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

fieldOf :: Functor f => Proxy# "preimage" -> (ByteString -> f ByteString) -> SettleInvoiceMsg -> f SettleInvoiceMsg

HasField SubscribeSingleInvoiceRequest "rHash" ByteString 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

fieldOf :: Functor f => Proxy# "rHash" -> (ByteString -> f ByteString) -> SubscribeSingleInvoiceRequest -> f SubscribeSingleInvoiceRequest

HasField BatchOpenChannel "nodePubkey" ByteString 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "nodePubkey" -> (ByteString -> f ByteString) -> BatchOpenChannel -> f BatchOpenChannel

HasField BatchOpenChannel "pendingChanId" ByteString 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "pendingChanId" -> (ByteString -> f ByteString) -> BatchOpenChannel -> f BatchOpenChannel

HasField ChannelAcceptRequest "chainHash" ByteString 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "chainHash" -> (ByteString -> f ByteString) -> ChannelAcceptRequest -> f ChannelAcceptRequest

HasField ChannelAcceptRequest "nodePubkey" ByteString 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "nodePubkey" -> (ByteString -> f ByteString) -> ChannelAcceptRequest -> f ChannelAcceptRequest

HasField ChannelAcceptRequest "pendingChanId" ByteString 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "pendingChanId" -> (ByteString -> f ByteString) -> ChannelAcceptRequest -> f ChannelAcceptRequest

HasField ChannelAcceptResponse "pendingChanId" ByteString 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "pendingChanId" -> (ByteString -> f ByteString) -> ChannelAcceptResponse -> f ChannelAcceptResponse

HasField ChannelCloseUpdate "closingTxid" ByteString 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "closingTxid" -> (ByteString -> f ByteString) -> ChannelCloseUpdate -> f ChannelCloseUpdate

HasField ConfirmationUpdate "blockSha" ByteString 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "blockSha" -> (ByteString -> f ByteString) -> ConfirmationUpdate -> f ConfirmationUpdate

HasField CustomMessage "data'" ByteString 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "data'" -> (ByteString -> f ByteString) -> CustomMessage -> f CustomMessage

HasField CustomMessage "peer" ByteString 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "peer" -> (ByteString -> f ByteString) -> CustomMessage -> f CustomMessage

HasField ListChannelsRequest "peer" ByteString 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "peer" -> (ByteString -> f ByteString) -> ListChannelsRequest -> f ListChannelsRequest

HasField OpenChannelRequest "nodePubkey" ByteString 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "nodePubkey" -> (ByteString -> f ByteString) -> OpenChannelRequest -> f OpenChannelRequest

HasField OpenStatusUpdate "pendingChanId" ByteString 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "pendingChanId" -> (ByteString -> f ByteString) -> OpenStatusUpdate -> f OpenStatusUpdate

HasField Peer "lastPingPayload" ByteString 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "lastPingPayload" -> (ByteString -> f ByteString) -> Peer -> f Peer

HasField ReadyForPsbtFunding "psbt" ByteString 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "psbt" -> (ByteString -> f ByteString) -> ReadyForPsbtFunding -> f ReadyForPsbtFunding

HasField SendCustomMessageRequest "data'" ByteString 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "data'" -> (ByteString -> f ByteString) -> SendCustomMessageRequest -> f SendCustomMessageRequest

HasField SendCustomMessageRequest "peer" ByteString 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "peer" -> (ByteString -> f ByteString) -> SendCustomMessageRequest -> f SendCustomMessageRequest

HasField SendRequest "dest" ByteString 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "dest" -> (ByteString -> f ByteString) -> SendRequest -> f SendRequest

HasField SendRequest "lastHopPubkey" ByteString 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "lastHopPubkey" -> (ByteString -> f ByteString) -> SendRequest -> f SendRequest

HasField SendRequest "paymentAddr" ByteString 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "paymentAddr" -> (ByteString -> f ByteString) -> SendRequest -> f SendRequest

HasField SendRequest "paymentHash" ByteString 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "paymentHash" -> (ByteString -> f ByteString) -> SendRequest -> f SendRequest

HasField SendRequest'DestCustomRecordsEntry "value" ByteString 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "value" -> (ByteString -> f ByteString) -> SendRequest'DestCustomRecordsEntry -> f SendRequest'DestCustomRecordsEntry

HasField SendResponse "paymentHash" ByteString 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "paymentHash" -> (ByteString -> f ByteString) -> SendResponse -> f SendResponse

HasField SendResponse "paymentPreimage" ByteString 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "paymentPreimage" -> (ByteString -> f ByteString) -> SendResponse -> f SendResponse

HasField SendToRouteRequest "paymentHash" ByteString 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "paymentHash" -> (ByteString -> f ByteString) -> SendToRouteRequest -> f SendToRouteRequest

HasField SignMessageRequest "msg" ByteString 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "msg" -> (ByteString -> f ByteString) -> SignMessageRequest -> f SignMessageRequest

HasField VerifyMessageRequest "msg" ByteString 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "msg" -> (ByteString -> f ByteString) -> VerifyMessageRequest -> f VerifyMessageRequest

HasField AMPRecord "rootShare" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "rootShare" -> (ByteString -> f ByteString) -> AMPRecord -> f AMPRecord

HasField AMPRecord "setId" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "setId" -> (ByteString -> f ByteString) -> AMPRecord -> f AMPRecord

HasField ChanPointShim "pendingChanId" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "pendingChanId" -> (ByteString -> f ByteString) -> ChanPointShim -> f ChanPointShim

HasField ChanPointShim "remoteKey" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "remoteKey" -> (ByteString -> f ByteString) -> ChanPointShim -> f ChanPointShim

HasField ChannelPoint "fundingTxidBytes" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "fundingTxidBytes" -> (ByteString -> f ByteString) -> ChannelPoint -> f ChannelPoint

HasField FundingPsbtFinalize "finalRawTx" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "finalRawTx" -> (ByteString -> f ByteString) -> FundingPsbtFinalize -> f FundingPsbtFinalize

HasField FundingPsbtFinalize "pendingChanId" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "pendingChanId" -> (ByteString -> f ByteString) -> FundingPsbtFinalize -> f FundingPsbtFinalize

HasField FundingPsbtFinalize "signedPsbt" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "signedPsbt" -> (ByteString -> f ByteString) -> FundingPsbtFinalize -> f FundingPsbtFinalize

HasField FundingPsbtVerify "fundedPsbt" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "fundedPsbt" -> (ByteString -> f ByteString) -> FundingPsbtVerify -> f FundingPsbtVerify

HasField FundingPsbtVerify "pendingChanId" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "pendingChanId" -> (ByteString -> f ByteString) -> FundingPsbtVerify -> f FundingPsbtVerify

HasField FundingShimCancel "pendingChanId" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "pendingChanId" -> (ByteString -> f ByteString) -> FundingShimCancel -> f FundingShimCancel

HasField HTLC "hashLock" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "hashLock" -> (ByteString -> f ByteString) -> HTLC -> f HTLC

HasField Hop'CustomRecordsEntry "value" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "value" -> (ByteString -> f ByteString) -> Hop'CustomRecordsEntry -> f Hop'CustomRecordsEntry

HasField KeyDescriptor "rawKeyBytes" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "rawKeyBytes" -> (ByteString -> f ByteString) -> KeyDescriptor -> f KeyDescriptor

HasField MPPRecord "paymentAddr" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "paymentAddr" -> (ByteString -> f ByteString) -> MPPRecord -> f MPPRecord

HasField NodePair "from" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "from" -> (ByteString -> f ByteString) -> NodePair -> f NodePair

HasField NodePair "to" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "to" -> (ByteString -> f ByteString) -> NodePair -> f NodePair

HasField NodeUpdate "globalFeatures" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "globalFeatures" -> (ByteString -> f ByteString) -> NodeUpdate -> f NodeUpdate

HasField OutPoint "txidBytes" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "txidBytes" -> (ByteString -> f ByteString) -> OutPoint -> f OutPoint

HasField PendingUpdate "txid" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "txid" -> (ByteString -> f ByteString) -> PendingUpdate -> f PendingUpdate

HasField PsbtShim "basePsbt" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "basePsbt" -> (ByteString -> f ByteString) -> PsbtShim -> f PsbtShim

HasField PsbtShim "pendingChanId" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "pendingChanId" -> (ByteString -> f ByteString) -> PsbtShim -> f PsbtShim

HasField QueryRoutesRequest "lastHopPubkey" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "lastHopPubkey" -> (ByteString -> f ByteString) -> QueryRoutesRequest -> f QueryRoutesRequest

HasField QueryRoutesRequest'DestCustomRecordsEntry "value" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "value" -> (ByteString -> f ByteString) -> QueryRoutesRequest'DestCustomRecordsEntry -> f QueryRoutesRequest'DestCustomRecordsEntry

HasField AMP "hash" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "hash" -> (ByteString -> f ByteString) -> AMP -> f AMP

HasField AMP "preimage" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "preimage" -> (ByteString -> f ByteString) -> AMP -> f AMP

HasField AMP "rootShare" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "rootShare" -> (ByteString -> f ByteString) -> AMP -> f AMP

HasField AMP "setId" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "setId" -> (ByteString -> f ByteString) -> AMP -> f AMP

HasField AddInvoiceResponse "paymentAddr" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "paymentAddr" -> (ByteString -> f ByteString) -> AddInvoiceResponse -> f AddInvoiceResponse

HasField AddInvoiceResponse "rHash" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "rHash" -> (ByteString -> f ByteString) -> AddInvoiceResponse -> f AddInvoiceResponse

HasField ChannelBackup "chanBackup" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "chanBackup" -> (ByteString -> f ByteString) -> ChannelBackup -> f ChannelBackup

HasField ChannelUpdate "chainHash" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "chainHash" -> (ByteString -> f ByteString) -> ChannelUpdate -> f ChannelUpdate

HasField ChannelUpdate "extraOpaqueData" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "extraOpaqueData" -> (ByteString -> f ByteString) -> ChannelUpdate -> f ChannelUpdate

HasField ChannelUpdate "signature" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "signature" -> (ByteString -> f ByteString) -> ChannelUpdate -> f ChannelUpdate

HasField CheckMacPermRequest "macaroon" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "macaroon" -> (ByteString -> f ByteString) -> CheckMacPermRequest -> f CheckMacPermRequest

HasField DeletePaymentRequest "paymentHash" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "paymentHash" -> (ByteString -> f ByteString) -> DeletePaymentRequest -> f DeletePaymentRequest

HasField Failure "onionSha256" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "onionSha256" -> (ByteString -> f ByteString) -> Failure -> f Failure

HasField HTLCAttempt "preimage" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "preimage" -> (ByteString -> f ByteString) -> HTLCAttempt -> f HTLCAttempt

HasField InterceptFeedback "replacementSerialized" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "replacementSerialized" -> (ByteString -> f ByteString) -> InterceptFeedback -> f InterceptFeedback

HasField Invoice "descriptionHash" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "descriptionHash" -> (ByteString -> f ByteString) -> Invoice -> f Invoice

HasField Invoice "paymentAddr" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "paymentAddr" -> (ByteString -> f ByteString) -> Invoice -> f Invoice

HasField Invoice "rHash" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "rHash" -> (ByteString -> f ByteString) -> Invoice -> f Invoice

HasField Invoice "rPreimage" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "rPreimage" -> (ByteString -> f ByteString) -> Invoice -> f Invoice

HasField InvoiceHTLC'CustomRecordsEntry "value" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "value" -> (ByteString -> f ByteString) -> InvoiceHTLC'CustomRecordsEntry -> f InvoiceHTLC'CustomRecordsEntry

HasField MacaroonId "nonce" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "nonce" -> (ByteString -> f ByteString) -> MacaroonId -> f MacaroonId

HasField MacaroonId "storageId" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "storageId" -> (ByteString -> f ByteString) -> MacaroonId -> f MacaroonId

HasField MultiChanBackup "multiChanBackup" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "multiChanBackup" -> (ByteString -> f ByteString) -> MultiChanBackup -> f MultiChanBackup

HasField PayReq "paymentAddr" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "paymentAddr" -> (ByteString -> f ByteString) -> PayReq -> f PayReq

HasField PaymentHash "rHash" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "rHash" -> (ByteString -> f ByteString) -> PaymentHash -> f PaymentHash

HasField RPCMessage "serialized" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "serialized" -> (ByteString -> f ByteString) -> RPCMessage -> f RPCMessage

HasField RPCMiddlewareRequest "rawMacaroon" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "rawMacaroon" -> (ByteString -> f ByteString) -> RPCMiddlewareRequest -> f RPCMiddlewareRequest

HasField RestoreChanBackupRequest "multiChanBackup" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "multiChanBackup" -> (ByteString -> f ByteString) -> RestoreChanBackupRequest -> f RestoreChanBackupRequest

HasField SetID "setId" ByteString 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "setId" -> (ByteString -> f ByteString) -> SetID -> f SetID

HasField BuildRouteRequest "paymentAddr" ByteString 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "paymentAddr" -> (ByteString -> f ByteString) -> BuildRouteRequest -> f BuildRouteRequest

HasField ForwardHtlcInterceptRequest "onionBlob" ByteString 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "onionBlob" -> (ByteString -> f ByteString) -> ForwardHtlcInterceptRequest -> f ForwardHtlcInterceptRequest

HasField ForwardHtlcInterceptRequest "paymentHash" ByteString 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "paymentHash" -> (ByteString -> f ByteString) -> ForwardHtlcInterceptRequest -> f ForwardHtlcInterceptRequest

HasField ForwardHtlcInterceptRequest'CustomRecordsEntry "value" ByteString 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "value" -> (ByteString -> f ByteString) -> ForwardHtlcInterceptRequest'CustomRecordsEntry -> f ForwardHtlcInterceptRequest'CustomRecordsEntry

HasField ForwardHtlcInterceptResponse "preimage" ByteString 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "preimage" -> (ByteString -> f ByteString) -> ForwardHtlcInterceptResponse -> f ForwardHtlcInterceptResponse

HasField PairHistory "nodeFrom" ByteString 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "nodeFrom" -> (ByteString -> f ByteString) -> PairHistory -> f PairHistory

HasField PairHistory "nodeTo" ByteString 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "nodeTo" -> (ByteString -> f ByteString) -> PairHistory -> f PairHistory

HasField PaymentStatus "preimage" ByteString 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "preimage" -> (ByteString -> f ByteString) -> PaymentStatus -> f PaymentStatus

HasField QueryProbabilityRequest "fromNode" ByteString 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "fromNode" -> (ByteString -> f ByteString) -> QueryProbabilityRequest -> f QueryProbabilityRequest

HasField QueryProbabilityRequest "toNode" ByteString 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "toNode" -> (ByteString -> f ByteString) -> QueryProbabilityRequest -> f QueryProbabilityRequest

HasField RouteFeeRequest "dest" ByteString 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "dest" -> (ByteString -> f ByteString) -> RouteFeeRequest -> f RouteFeeRequest

HasField SendPaymentRequest "dest" ByteString 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "dest" -> (ByteString -> f ByteString) -> SendPaymentRequest -> f SendPaymentRequest

HasField SendPaymentRequest "lastHopPubkey" ByteString 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "lastHopPubkey" -> (ByteString -> f ByteString) -> SendPaymentRequest -> f SendPaymentRequest

HasField SendPaymentRequest "paymentAddr" ByteString 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "paymentAddr" -> (ByteString -> f ByteString) -> SendPaymentRequest -> f SendPaymentRequest

HasField SendPaymentRequest "paymentHash" ByteString 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "paymentHash" -> (ByteString -> f ByteString) -> SendPaymentRequest -> f SendPaymentRequest

HasField SendPaymentRequest'DestCustomRecordsEntry "value" ByteString 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "value" -> (ByteString -> f ByteString) -> SendPaymentRequest'DestCustomRecordsEntry -> f SendPaymentRequest'DestCustomRecordsEntry

HasField SendToRouteRequest "paymentHash" ByteString 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "paymentHash" -> (ByteString -> f ByteString) -> SendToRouteRequest -> f SendToRouteRequest

HasField SendToRouteResponse "preimage" ByteString 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "preimage" -> (ByteString -> f ByteString) -> SendToRouteResponse -> f SendToRouteResponse

HasField SettleEvent "preimage" ByteString 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "preimage" -> (ByteString -> f ByteString) -> SettleEvent -> f SettleEvent

HasField TrackPaymentRequest "paymentHash" ByteString 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "paymentHash" -> (ByteString -> f ByteString) -> TrackPaymentRequest -> f TrackPaymentRequest

HasField InputScript "sigScript" ByteString 
Instance details

Defined in Proto.Signrpc.Signer

Methods

fieldOf :: Functor f => Proxy# "sigScript" -> (ByteString -> f ByteString) -> InputScript -> f InputScript

HasField KeyDescriptor "rawKeyBytes" ByteString 
Instance details

Defined in Proto.Signrpc.Signer

Methods

fieldOf :: Functor f => Proxy# "rawKeyBytes" -> (ByteString -> f ByteString) -> KeyDescriptor -> f KeyDescriptor

HasField SharedKeyRequest "ephemeralPubkey" ByteString 
Instance details

Defined in Proto.Signrpc.Signer

Methods

fieldOf :: Functor f => Proxy# "ephemeralPubkey" -> (ByteString -> f ByteString) -> SharedKeyRequest -> f SharedKeyRequest

HasField SharedKeyResponse "sharedKey" ByteString 
Instance details

Defined in Proto.Signrpc.Signer

Methods

fieldOf :: Functor f => Proxy# "sharedKey" -> (ByteString -> f ByteString) -> SharedKeyResponse -> f SharedKeyResponse

HasField SignDescriptor "doubleTweak" ByteString 
Instance details

Defined in Proto.Signrpc.Signer

Methods

fieldOf :: Functor f => Proxy# "doubleTweak" -> (ByteString -> f ByteString) -> SignDescriptor -> f SignDescriptor

HasField SignDescriptor "singleTweak" ByteString 
Instance details

Defined in Proto.Signrpc.Signer

Methods

fieldOf :: Functor f => Proxy# "singleTweak" -> (ByteString -> f ByteString) -> SignDescriptor -> f SignDescriptor

HasField SignDescriptor "witnessScript" ByteString 
Instance details

Defined in Proto.Signrpc.Signer

Methods

fieldOf :: Functor f => Proxy# "witnessScript" -> (ByteString -> f ByteString) -> SignDescriptor -> f SignDescriptor

HasField SignMessageReq "msg" ByteString 
Instance details

Defined in Proto.Signrpc.Signer

Methods

fieldOf :: Functor f => Proxy# "msg" -> (ByteString -> f ByteString) -> SignMessageReq -> f SignMessageReq

HasField SignMessageResp "signature" ByteString 
Instance details

Defined in Proto.Signrpc.Signer

Methods

fieldOf :: Functor f => Proxy# "signature" -> (ByteString -> f ByteString) -> SignMessageResp -> f SignMessageResp

HasField SignReq "rawTxBytes" ByteString 
Instance details

Defined in Proto.Signrpc.Signer

Methods

fieldOf :: Functor f => Proxy# "rawTxBytes" -> (ByteString -> f ByteString) -> SignReq -> f SignReq

HasField TxOut "pkScript" ByteString 
Instance details

Defined in Proto.Signrpc.Signer

Methods

fieldOf :: Functor f => Proxy# "pkScript" -> (ByteString -> f ByteString) -> TxOut -> f TxOut

HasField VerifyMessageReq "msg" ByteString 
Instance details

Defined in Proto.Signrpc.Signer

Methods

fieldOf :: Functor f => Proxy# "msg" -> (ByteString -> f ByteString) -> VerifyMessageReq -> f VerifyMessageReq

HasField VerifyMessageReq "pubkey" ByteString 
Instance details

Defined in Proto.Signrpc.Signer

Methods

fieldOf :: Functor f => Proxy# "pubkey" -> (ByteString -> f ByteString) -> VerifyMessageReq -> f VerifyMessageReq

HasField VerifyMessageReq "signature" ByteString 
Instance details

Defined in Proto.Signrpc.Signer

Methods

fieldOf :: Functor f => Proxy# "signature" -> (ByteString -> f ByteString) -> VerifyMessageReq -> f VerifyMessageReq

HasField Account "masterKeyFingerprint" ByteString 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "masterKeyFingerprint" -> (ByteString -> f ByteString) -> Account -> f Account

HasField FinalizePsbtRequest "fundedPsbt" ByteString 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "fundedPsbt" -> (ByteString -> f ByteString) -> FinalizePsbtRequest -> f FinalizePsbtRequest

HasField FinalizePsbtResponse "rawFinalTx" ByteString 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "rawFinalTx" -> (ByteString -> f ByteString) -> FinalizePsbtResponse -> f FinalizePsbtResponse

HasField FinalizePsbtResponse "signedPsbt" ByteString 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "signedPsbt" -> (ByteString -> f ByteString) -> FinalizePsbtResponse -> f FinalizePsbtResponse

HasField FundPsbtRequest "psbt" ByteString 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "psbt" -> (ByteString -> f ByteString) -> FundPsbtRequest -> f FundPsbtRequest

HasField FundPsbtResponse "fundedPsbt" ByteString 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "fundedPsbt" -> (ByteString -> f ByteString) -> FundPsbtResponse -> f FundPsbtResponse

HasField ImportAccountRequest "masterKeyFingerprint" ByteString 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "masterKeyFingerprint" -> (ByteString -> f ByteString) -> ImportAccountRequest -> f ImportAccountRequest

HasField ImportPublicKeyRequest "publicKey" ByteString 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "publicKey" -> (ByteString -> f ByteString) -> ImportPublicKeyRequest -> f ImportPublicKeyRequest

HasField LabelTransactionRequest "txid" ByteString 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "txid" -> (ByteString -> f ByteString) -> LabelTransactionRequest -> f LabelTransactionRequest

HasField LeaseOutputRequest "id" ByteString 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "id" -> (ByteString -> f ByteString) -> LeaseOutputRequest -> f LeaseOutputRequest

HasField ReleaseOutputRequest "id" ByteString 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "id" -> (ByteString -> f ByteString) -> ReleaseOutputRequest -> f ReleaseOutputRequest

HasField SendOutputsResponse "rawTx" ByteString 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "rawTx" -> (ByteString -> f ByteString) -> SendOutputsResponse -> f SendOutputsResponse

HasField Transaction "txHex" ByteString 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "txHex" -> (ByteString -> f ByteString) -> Transaction -> f Transaction

HasField UtxoLease "id" ByteString 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "id" -> (ByteString -> f ByteString) -> UtxoLease -> f UtxoLease

HasField ChangePasswordRequest "currentPassword" ByteString 
Instance details

Defined in Proto.Walletunlocker

Methods

fieldOf :: Functor f => Proxy# "currentPassword" -> (ByteString -> f ByteString) -> ChangePasswordRequest -> f ChangePasswordRequest

HasField ChangePasswordRequest "newPassword" ByteString 
Instance details

Defined in Proto.Walletunlocker

Methods

fieldOf :: Functor f => Proxy# "newPassword" -> (ByteString -> f ByteString) -> ChangePasswordRequest -> f ChangePasswordRequest

HasField ChangePasswordResponse "adminMacaroon" ByteString 
Instance details

Defined in Proto.Walletunlocker

Methods

fieldOf :: Functor f => Proxy# "adminMacaroon" -> (ByteString -> f ByteString) -> ChangePasswordResponse -> f ChangePasswordResponse

HasField GenSeedRequest "aezeedPassphrase" ByteString 
Instance details

Defined in Proto.Walletunlocker

Methods

fieldOf :: Functor f => Proxy# "aezeedPassphrase" -> (ByteString -> f ByteString) -> GenSeedRequest -> f GenSeedRequest

HasField GenSeedRequest "seedEntropy" ByteString 
Instance details

Defined in Proto.Walletunlocker

Methods

fieldOf :: Functor f => Proxy# "seedEntropy" -> (ByteString -> f ByteString) -> GenSeedRequest -> f GenSeedRequest

HasField GenSeedResponse "encipheredSeed" ByteString 
Instance details

Defined in Proto.Walletunlocker

Methods

fieldOf :: Functor f => Proxy# "encipheredSeed" -> (ByteString -> f ByteString) -> GenSeedResponse -> f GenSeedResponse

HasField InitWalletRequest "aezeedPassphrase" ByteString 
Instance details

Defined in Proto.Walletunlocker

Methods

fieldOf :: Functor f => Proxy# "aezeedPassphrase" -> (ByteString -> f ByteString) -> InitWalletRequest -> f InitWalletRequest

HasField InitWalletRequest "walletPassword" ByteString 
Instance details

Defined in Proto.Walletunlocker

Methods

fieldOf :: Functor f => Proxy# "walletPassword" -> (ByteString -> f ByteString) -> InitWalletRequest -> f InitWalletRequest

HasField InitWalletResponse "adminMacaroon" ByteString 
Instance details

Defined in Proto.Walletunlocker

Methods

fieldOf :: Functor f => Proxy# "adminMacaroon" -> (ByteString -> f ByteString) -> InitWalletResponse -> f InitWalletResponse

HasField UnlockWalletRequest "walletPassword" ByteString 
Instance details

Defined in Proto.Walletunlocker

Methods

fieldOf :: Functor f => Proxy# "walletPassword" -> (ByteString -> f ByteString) -> UnlockWalletRequest -> f UnlockWalletRequest

HasField WatchOnly "masterKeyFingerprint" ByteString 
Instance details

Defined in Proto.Walletunlocker

Methods

fieldOf :: Functor f => Proxy# "masterKeyFingerprint" -> (ByteString -> f ByteString) -> WatchOnly -> f WatchOnly

HasField LookupInvoiceMsg "maybe'paymentAddr" (Maybe ByteString) 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

fieldOf :: Functor f => Proxy# "maybe'paymentAddr" -> (Maybe ByteString -> f (Maybe ByteString)) -> LookupInvoiceMsg -> f LookupInvoiceMsg

HasField LookupInvoiceMsg "maybe'paymentHash" (Maybe ByteString) 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

fieldOf :: Functor f => Proxy# "maybe'paymentHash" -> (Maybe ByteString -> f (Maybe ByteString)) -> LookupInvoiceMsg -> f LookupInvoiceMsg

HasField LookupInvoiceMsg "maybe'setId" (Maybe ByteString) 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

fieldOf :: Functor f => Proxy# "maybe'setId" -> (Maybe ByteString -> f (Maybe ByteString)) -> LookupInvoiceMsg -> f LookupInvoiceMsg

HasField ChannelPoint "maybe'fundingTxidBytes" (Maybe ByteString) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "maybe'fundingTxidBytes" -> (Maybe ByteString -> f (Maybe ByteString)) -> ChannelPoint -> f ChannelPoint

HasField QueryRoutesRequest "ignoredNodes" [ByteString] 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "ignoredNodes" -> ([ByteString] -> f [ByteString]) -> QueryRoutesRequest -> f QueryRoutesRequest

HasField QueryRoutesRequest "vec'ignoredNodes" (Vector ByteString) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "vec'ignoredNodes" -> (Vector ByteString -> f (Vector ByteString)) -> QueryRoutesRequest -> f QueryRoutesRequest

HasField RestoreChanBackupRequest "maybe'multiChanBackup" (Maybe ByteString) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "maybe'multiChanBackup" -> (Maybe ByteString -> f (Maybe ByteString)) -> RestoreChanBackupRequest -> f RestoreChanBackupRequest

HasField BuildRouteRequest "hopPubkeys" [ByteString] 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "hopPubkeys" -> ([ByteString] -> f [ByteString]) -> BuildRouteRequest -> f BuildRouteRequest

HasField BuildRouteRequest "vec'hopPubkeys" (Vector ByteString) 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "vec'hopPubkeys" -> (Vector ByteString -> f (Vector ByteString)) -> BuildRouteRequest -> f BuildRouteRequest

HasField InputScript "vec'witness" (Vector ByteString) 
Instance details

Defined in Proto.Signrpc.Signer

Methods

fieldOf :: Functor f => Proxy# "vec'witness" -> (Vector ByteString -> f (Vector ByteString)) -> InputScript -> f InputScript

HasField InputScript "witness" [ByteString] 
Instance details

Defined in Proto.Signrpc.Signer

Methods

fieldOf :: Functor f => Proxy# "witness" -> ([ByteString] -> f [ByteString]) -> InputScript -> f InputScript

HasField SignResp "rawSigs" [ByteString] 
Instance details

Defined in Proto.Signrpc.Signer

Methods

fieldOf :: Functor f => Proxy# "rawSigs" -> ([ByteString] -> f [ByteString]) -> SignResp -> f SignResp

HasField SignResp "vec'rawSigs" (Vector ByteString) 
Instance details

Defined in Proto.Signrpc.Signer

Methods

fieldOf :: Functor f => Proxy# "vec'rawSigs" -> (Vector ByteString -> f (Vector ByteString)) -> SignResp -> f SignResp

HasField FundPsbtRequest "maybe'psbt" (Maybe ByteString) 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "maybe'psbt" -> (Maybe ByteString -> f (Maybe ByteString)) -> FundPsbtRequest -> f FundPsbtRequest

HasField SendRequest "destCustomRecords" (Map Word64 ByteString) 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "destCustomRecords" -> (Map Word64 ByteString -> f (Map Word64 ByteString)) -> SendRequest -> f SendRequest

HasField Hop "customRecords" (Map Word64 ByteString) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "customRecords" -> (Map Word64 ByteString -> f (Map Word64 ByteString)) -> Hop -> f Hop

HasField QueryRoutesRequest "destCustomRecords" (Map Word64 ByteString) 
Instance details

Defined in Proto.Lnrpc.Ln0

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.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "customRecords" -> (Map Word64 ByteString -> f (Map Word64 ByteString)) -> InvoiceHTLC -> f InvoiceHTLC

HasField ForwardHtlcInterceptRequest "customRecords" (Map Word64 ByteString) 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "customRecords" -> (Map Word64 ByteString -> f (Map Word64 ByteString)) -> ForwardHtlcInterceptRequest -> f ForwardHtlcInterceptRequest

HasField SendPaymentRequest "destCustomRecords" (Map Word64 ByteString) 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "destCustomRecords" -> (Map Word64 ByteString -> f (Map Word64 ByteString)) -> SendPaymentRequest -> f SendPaymentRequest

From ByteString (TxId 'Funding) Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Methods

from :: ByteString -> TxId 'Funding

ToFlushBuilder (Flush ByteString) 
Instance details

Defined in Yesod.Core.Content

FromGrpc (TxId a) ByteString 
Instance details

Defined in LndClient.Data.Newtype

ToGrpc (TxId a) ByteString 
Instance details

Defined in LndClient.Data.Newtype

ToContent (ContentType, Content) 
Instance details

Defined in Yesod.Core.Content

ToTypedContent (ContentType, Content) 
Instance details

Defined in Yesod.Core.Content

type ChunkElem ByteString 
Instance details

Defined in Data.Attoparsec.Internal.Types

type State ByteString 
Instance details

Defined in Data.Attoparsec.Internal.Types

type State ByteString = Buffer
type Item ByteString 
Instance details

Defined in Data.ByteString.Internal

type Element ByteString 
Instance details

Defined in Data.MonoTraversable

type Index ByteString 
Instance details

Defined in Data.Sequences

type Element ByteString 
Instance details

Defined in Universum.Container.Class

type FromListC ByteString 
Instance details

Defined in Universum.Container.Class

type ListElement ByteString 
Instance details

Defined in Universum.Container.Class

type OneItem ByteString 
Instance details

Defined in Universum.Container.Class

id :: a -> a #

Identity function.

id x = x

either :: (a -> c) -> (b -> c) -> Either a b -> c #

Case analysis for the Either type. If the value is Left a, apply the first function to a; if it is Right b, apply the second function to b.

Examples

Expand

We create two values of type Either String Int, one using the Left constructor and another using the Right constructor. Then we apply "either" the length function (if we have a String) or the "times-two" function (if we have an Int):

>>> let s = Left "foo" :: Either String Int
>>> let n = Right 3 :: Either String Int
>>> either length (*2) s
3
>>> either length (*2) n
6

class Monad m => MonadReader r (m :: Type -> Type) | m -> r where #

See examples in Control.Monad.Reader. Note, the partially applied function type (->) r is a simple reader monad. See the instance declaration below.

Minimal complete definition

(ask | reader), local

Methods

ask :: m r #

Retrieves the monad environment.

local #

Arguments

:: (r -> r)

The function to modify the environment.

-> m a

Reader to run in the modified environment.

-> m a 

Executes a computation in a modified environment.

reader #

Arguments

:: (r -> a)

The selector function to apply to the environment.

-> m a 

Retrieves a function of the current environment.

Instances

Instances details
Monad m => MonadReader Env (AppM m) Source # 
Instance details

Defined in BtcLsp.Data.AppM

Methods

ask :: AppM m Env #

local :: (Env -> Env) -> AppM m a -> AppM m a #

reader :: (Env -> a) -> AppM m a #

(Representable f, Rep f ~ a) => MonadReader a (Co f) 
Instance details

Defined in Data.Functor.Rep

Methods

ask :: Co f a #

local :: (a -> a) -> Co f a0 -> Co f a0 #

reader :: (a -> a0) -> Co f a0 #

MonadReader e m => MonadReader e (CatchT m) 
Instance details

Defined in Control.Monad.Catch.Pure

Methods

ask :: CatchT m e #

local :: (e -> e) -> CatchT m a -> CatchT m a #

reader :: (e -> a) -> CatchT m a #

(Functor m, MonadReader e m) => MonadReader e (Free m) 
Instance details

Defined in Control.Monad.Free

Methods

ask :: Free m e #

local :: (e -> e) -> Free m a -> Free m a #

reader :: (e -> a) -> Free m a #

MonadReader 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 #

MonadReader r m => MonadReader r (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

ask :: LoggingT m r #

local :: (r -> r) -> LoggingT m a -> LoggingT m a #

reader :: (r -> a) -> LoggingT m a #

MonadReader r m => MonadReader r (NoLoggingT m)

Since: monad-logger-0.3.24

Instance details

Defined in Control.Monad.Logger

Methods

ask :: NoLoggingT m r #

local :: (r -> r) -> NoLoggingT m a -> NoLoggingT m a #

reader :: (r -> a) -> NoLoggingT m a #

MonadReader r m => MonadReader r (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

ask :: ResourceT m r #

local :: (r -> r) -> ResourceT m a -> ResourceT m a #

reader :: (r -> a) -> ResourceT m a #

MonadReader r m => MonadReader r (ListT m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: ListT m r #

local :: (r -> r) -> ListT m a -> ListT m a #

reader :: (r -> a) -> ListT m a #

MonadReader r m => MonadReader r (MaybeT m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: MaybeT m r #

local :: (r -> r) -> MaybeT m a -> MaybeT m a #

reader :: (r -> a) -> MaybeT m a #

(Functor f, MonadReader r m) => MonadReader r (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

ask :: FreeT f m r #

local :: (r -> r) -> FreeT f m a -> FreeT f m a #

reader :: (r -> a) -> FreeT f m a #

(Error e, MonadReader r m) => MonadReader r (ErrorT e m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: ErrorT e m r #

local :: (r -> r) -> ErrorT e m a -> ErrorT e m a #

reader :: (r -> a) -> ErrorT e m a #

MonadReader r m => MonadReader r (ExceptT e m)

Since: mtl-2.2

Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: ExceptT e m r #

local :: (r -> r) -> ExceptT e m a -> ExceptT e m a #

reader :: (r -> a) -> ExceptT e m a #

MonadReader r m => MonadReader r (IdentityT m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: IdentityT m r #

local :: (r -> r) -> IdentityT m a -> IdentityT m a #

reader :: (r -> a) -> IdentityT m a #

Monad m => MonadReader r (ReaderT r m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: ReaderT r m r #

local :: (r -> r) -> ReaderT r m a -> ReaderT r m a #

reader :: (r -> a) -> ReaderT r m a #

MonadReader r m => MonadReader r (StateT s m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: StateT s m r #

local :: (r -> r) -> StateT s m a -> StateT s m a #

reader :: (r -> a) -> StateT s m a #

MonadReader r m => MonadReader r (StateT s m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: StateT s m r #

local :: (r -> r) -> StateT s m a -> StateT s m a #

reader :: (r -> a) -> StateT s m a #

(Monoid w, MonadReader r m) => MonadReader r (WriterT w m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: WriterT w m r #

local :: (r -> r) -> WriterT w m a -> WriterT w m a #

reader :: (r -> a) -> WriterT w m a #

(Monoid w, MonadReader r m) => MonadReader r (WriterT w m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: WriterT w m r #

local :: (r -> r) -> WriterT w m a -> WriterT w m a #

reader :: (r -> a) -> WriterT w m a #

MonadReader r m => MonadReader r (ConduitT i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

ask :: ConduitT i o m r #

local :: (r -> r) -> ConduitT i o m a -> ConduitT i o m a #

reader :: (r -> a) -> ConduitT i o m a #

MonadReader r ((->) r) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: r -> r #

local :: (r -> r) -> (r -> a) -> r -> a #

reader :: (r -> a) -> r -> a #

MonadReader r' m => MonadReader r' (ContT r m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: ContT r m r' #

local :: (r' -> r') -> ContT r m a -> ContT r m a #

reader :: (r' -> a) -> ContT r m a #

(Monad m, Monoid w) => MonadReader r (RWST r w s m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: RWST r w s m r #

local :: (r -> r) -> RWST r w s m a -> RWST r w s m a #

reader :: (r -> a) -> RWST r w s m a #

(Monad m, Monoid w) => MonadReader r (RWST r w s m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: RWST r w s m r #

local :: (r -> r) -> RWST r w s m a -> RWST r w s m a #

reader :: (r -> a) -> RWST r w s m a #

MonadReader r m => MonadReader r (Pipe l i o u m) 
Instance details

Defined in Data.Conduit.Internal.Pipe

Methods

ask :: Pipe l i o u m r #

local :: (r -> r) -> Pipe l i o u m a -> Pipe l i o u m a #

reader :: (r -> a) -> Pipe l i o u m a #

MonadReader (WidgetData site) (WidgetFor site) 
Instance details

Defined in Yesod.Core.Types

Methods

ask :: WidgetFor site (WidgetData site) #

local :: (WidgetData site -> WidgetData site) -> WidgetFor site a -> WidgetFor site a #

reader :: (WidgetData site -> a) -> WidgetFor site a #

MonadReader (HandlerData site site) (HandlerFor site) 
Instance details

Defined in Yesod.Core.Types

Methods

ask :: HandlerFor site (HandlerData site site) #

local :: (HandlerData site site -> HandlerData site site) -> HandlerFor site a -> HandlerFor site a #

reader :: (HandlerData site site -> a) -> HandlerFor site a #

MonadReader (HandlerData child master) (SubHandlerFor child master) 
Instance details

Defined in Yesod.Core.Types

Methods

ask :: SubHandlerFor child master (HandlerData child master) #

local :: (HandlerData child master -> HandlerData child master) -> SubHandlerFor child master a -> SubHandlerFor child master a #

reader :: (HandlerData child master -> a) -> SubHandlerFor child master a #

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.

Instances

Instances details
MonadState s m => MonadState s (CatchT m) 
Instance details

Defined in Control.Monad.Catch.Pure

Methods

get :: CatchT m s #

put :: s -> CatchT m () #

state :: (s -> (a, s)) -> CatchT m a #

(Functor m, MonadState s m) => MonadState s (Free m) 
Instance details

Defined in Control.Monad.Free

Methods

get :: Free m s #

put :: s -> Free m () #

state :: (s -> (a, s)) -> Free 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 #

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 (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 (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 (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 (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 (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 #

(Functor f, MonadState s m) => MonadState s (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

get :: FreeT f m s #

put :: s -> FreeT f m () #

state :: (s -> (a, s)) -> FreeT f 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 (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 #

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 (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 => 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 #

(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 #

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 #

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 #

(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 #

class Hashable a where #

The class of types that can be converted to a hash value.

Minimal implementation: hashWithSalt.

Note: the hash is not guaranteed to be stable across library versions, operating systems or architectures. For stable hashing use named hashes: SHA256, CRC32 etc.

If you are looking for Hashable instance in time package, check time-compat

Minimal complete definition

Nothing

Methods

hashWithSalt :: Int -> a -> Int infixl 0 #

Return a hash value for the argument, using the given salt.

The general contract of hashWithSalt is:

  • If two values are equal according to the == method, then applying the hashWithSalt method on each of the two values must produce the same integer result if the same salt is used in each case.
  • It is not required that if two values are unequal according to the == method, then applying the hashWithSalt method on each of the two values must produce distinct integer results. However, the programmer should be aware that producing distinct integer results for unequal values may improve the performance of hashing-based data structures.
  • This method can be used to compute different hash values for the same input by providing a different salt in each application of the method. This implies that any instance that defines hashWithSalt must make use of the salt in its implementation.
  • hashWithSalt may return negative Int values.

Instances

Instances details
Hashable Value 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

hashWithSalt :: Int -> Value -> Int #

hash :: Value -> Int #

Hashable SomeTypeRep 
Instance details

Defined in Data.Hashable.Class

Hashable Unique 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Unique -> Int #

hash :: Unique -> Int #

Hashable Version 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Version -> Int #

hash :: Version -> Int #

Hashable Void 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Void -> Int #

hash :: Void -> Int #

Hashable IntPtr 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> IntPtr -> Int #

hash :: IntPtr -> Int #

Hashable WordPtr 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> WordPtr -> Int #

hash :: WordPtr -> Int #

Hashable ThreadId 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> ThreadId -> Int #

hash :: ThreadId -> Int #

Hashable Fingerprint

Since: hashable-1.3.0.0

Instance details

Defined in Data.Hashable.Class

Hashable Int16 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int16 -> Int #

hash :: Int16 -> Int #

Hashable Int32 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int32 -> Int #

hash :: Int32 -> Int #

Hashable Int64 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int64 -> Int #

hash :: Int64 -> Int #

Hashable Int8 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int8 -> Int #

hash :: Int8 -> Int #

Hashable Word16 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word16 -> Int #

hash :: Word16 -> Int #

Hashable Word32 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word32 -> Int #

hash :: Word32 -> Int #

Hashable Word64 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word64 -> Int #

hash :: Word64 -> Int #

Hashable ByteString 
Instance details

Defined in Data.Hashable.Class

Hashable ByteString 
Instance details

Defined in Data.Hashable.Class

Hashable ShortByteString 
Instance details

Defined in Data.Hashable.Class

Hashable Day 
Instance details

Defined in Chronos

Methods

hashWithSalt :: Int -> Day -> Int #

hash :: Day -> Int #

Hashable DayOfWeek 
Instance details

Defined in Chronos

Hashable Time 
Instance details

Defined in Chronos

Methods

hashWithSalt :: Int -> Time -> Int #

hash :: Time -> Int #

Hashable IntSet

Since: hashable-1.3.4.0

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> IntSet -> Int #

hash :: IntSet -> Int #

Hashable BigNat 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> BigNat -> Int #

hash :: BigNat -> Int #

Hashable Ordering 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Ordering -> Int #

hash :: Ordering -> Int #

Hashable Scientific

A hash can be safely calculated from a Scientific. No magnitude 10^e is calculated so there's no risk of a blowup in space or time when hashing scientific numbers coming from untrusted sources.

Instance details

Defined in Data.Scientific

Hashable Msg 
Instance details

Defined in Crypto.Secp256k1

Methods

hashWithSalt :: Int -> Msg -> Int #

hash :: Msg -> Int #

Hashable PubKey 
Instance details

Defined in Crypto.Secp256k1

Methods

hashWithSalt :: Int -> PubKey -> Int #

hash :: PubKey -> Int #

Hashable SecKey 
Instance details

Defined in Crypto.Secp256k1

Methods

hashWithSalt :: Int -> SecKey -> Int #

hash :: SecKey -> Int #

Hashable Sig 
Instance details

Defined in Crypto.Secp256k1

Methods

hashWithSalt :: Int -> Sig -> Int #

hash :: Sig -> Int #

Hashable Tweak 
Instance details

Defined in Crypto.Secp256k1

Methods

hashWithSalt :: Int -> Tweak -> Int #

hash :: Tweak -> Int #

Hashable Text 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Text -> Int #

hash :: Text -> Int #

Hashable Text 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Text -> Int #

hash :: Text -> Int #

Hashable ShortText 
Instance details

Defined in Data.Text.Short.Internal

Hashable UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

hashWithSalt :: Int -> UUID -> Int #

hash :: UUID -> Int #

Hashable Word8 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word8 -> Int #

hash :: Word8 -> Int #

Hashable Integer 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Integer -> Int #

hash :: Integer -> Int #

Hashable Natural 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Natural -> Int #

hash :: Natural -> Int #

Hashable () 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> () -> Int #

hash :: () -> Int #

Hashable Bool 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Bool -> Int #

hash :: Bool -> Int #

Hashable Char 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Char -> Int #

hash :: Char -> Int #

Hashable Double

Note: prior to hashable-1.3.0.0, hash 0.0 /= hash (-0.0)

The hash of NaN is not well defined.

Since: hashable-1.3.0.0

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Double -> Int #

hash :: Double -> Int #

Hashable Float

Note: prior to hashable-1.3.0.0, hash 0.0 /= hash (-0.0)

The hash of NaN is not well defined.

Since: hashable-1.3.0.0

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Float -> Int #

hash :: Float -> Int #

Hashable Int 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int -> Int #

hash :: Int -> Int #

Hashable Word 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word -> Int #

hash :: Word -> Int #

Hashable (Async a) 
Instance details

Defined in Control.Concurrent.Async

Methods

hashWithSalt :: Int -> Async a -> Int #

hash :: Async a -> Int #

Hashable a => Hashable (Complex a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Complex a -> Int #

hash :: Complex a -> Int #

Hashable a => Hashable (Identity a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Identity a -> Int #

hash :: Identity a -> Int #

Hashable a => Hashable (First a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> First a -> Int #

hash :: First a -> Int #

Hashable a => Hashable (Last a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Last a -> Int #

hash :: Last a -> Int #

Hashable a => Hashable (Max a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Max a -> Int #

hash :: Max a -> Int #

Hashable a => Hashable (Min a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Min a -> Int #

hash :: Min a -> Int #

Hashable a => Hashable (Option a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Option a -> Int #

hash :: Option a -> Int #

Hashable a => Hashable (WrappedMonoid a) 
Instance details

Defined in Data.Hashable.Class

Hashable a => Hashable (NonEmpty a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> NonEmpty a -> Int #

hash :: NonEmpty a -> Int #

Hashable (FunPtr a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> FunPtr a -> Int #

hash :: FunPtr a -> Int #

Hashable (Ptr a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Ptr a -> Int #

hash :: Ptr a -> Int #

Hashable a => Hashable (Ratio a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Ratio a -> Int #

hash :: Ratio a -> Int #

Hashable (StableName a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> StableName a -> Int #

hash :: StableName a -> Int #

Hashable s => Hashable (CI s) 
Instance details

Defined in Data.CaseInsensitive.Internal

Methods

hashWithSalt :: Int -> CI s -> Int #

hash :: CI s -> Int #

Hashable v => Hashable (IntMap v)

Since: hashable-1.3.4.0

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> IntMap v -> Int #

hash :: IntMap v -> Int #

Hashable v => Hashable (Seq v)

Since: hashable-1.3.4.0

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Seq v -> Int #

hash :: Seq v -> Int #

Hashable v => Hashable (Set v)

Since: hashable-1.3.4.0

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Set v -> Int #

hash :: Set v -> Int #

Hashable v => Hashable (Tree v)

Since: hashable-1.3.4.0

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Tree v -> Int #

hash :: Tree v -> Int #

Hashable1 f => Hashable (Fix f) 
Instance details

Defined in Data.Fix

Methods

hashWithSalt :: Int -> Fix f -> Int #

hash :: Fix f -> Int #

Hashable (Hashed a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Hashed a -> Int #

hash :: Hashed a -> Int #

Hashable a => Hashable (Maybe a) 
Instance details

Defined in Data.Strict.Maybe

Methods

hashWithSalt :: Int -> Maybe a -> Int #

hash :: Maybe a -> Int #

Hashable a => Hashable (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Methods

hashWithSalt :: Int -> HashSet a -> Int #

hash :: HashSet a -> Int #

Hashable a => Hashable (Maybe a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Maybe a -> Int #

hash :: Maybe a -> Int #

Hashable a => Hashable (a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> (a) -> Int #

hash :: (a) -> Int #

Hashable a => Hashable [a] 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> [a] -> Int #

hash :: [a] -> Int #

(Hashable a, Hashable b) => Hashable (Either a b) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Either a b -> Int #

hash :: Either a b -> Int #

Hashable (Fixed a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Fixed a -> Int #

hash :: Fixed a -> Int #

Hashable (Proxy a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Proxy a -> Int #

hash :: Proxy a -> Int #

Hashable a => Hashable (Arg a b)

Note: Prior to hashable-1.3.0.0 the hash computation included the second argument of Arg which wasn't consistent with its Eq instance.

Since: hashable-1.3.0.0

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Arg a b -> Int #

hash :: Arg a b -> Int #

Hashable (TypeRep a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> TypeRep a -> Int #

hash :: TypeRep a -> Int #

(Hashable k, Hashable v) => Hashable (Map k v)

Since: hashable-1.3.4.0

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Map k v -> Int #

hash :: Map k v -> Int #

(Hashable a, Hashable b) => Hashable (Either a b) 
Instance details

Defined in Data.Strict.Either

Methods

hashWithSalt :: Int -> Either a b -> Int #

hash :: Either a b -> Int #

(Hashable a, Hashable b) => Hashable (These a b) 
Instance details

Defined in Data.Strict.These

Methods

hashWithSalt :: Int -> These a b -> Int #

hash :: These a b -> Int #

(Hashable a, Hashable b) => Hashable (Pair a b) 
Instance details

Defined in Data.Strict.Tuple

Methods

hashWithSalt :: Int -> Pair a b -> Int #

hash :: Pair a b -> Int #

(Hashable a, Hashable b) => Hashable (These a b) 
Instance details

Defined in Data.These

Methods

hashWithSalt :: Int -> These a b -> Int #

hash :: These a b -> Int #

(Hashable k, Hashable v) => Hashable (HashMap k v) 
Instance details

Defined in Data.HashMap.Internal

Methods

hashWithSalt :: Int -> HashMap k v -> Int #

hash :: HashMap k v -> Int #

(Hashable a1, Hashable a2) => Hashable (a1, a2) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> (a1, a2) -> Int #

hash :: (a1, a2) -> Int #

Hashable a => Hashable (Const a b) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Const a b -> Int #

hash :: Const a b -> Int #

(Hashable a1, Hashable a2, Hashable a3) => Hashable (a1, a2, a3) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> (a1, a2, a3) -> Int #

hash :: (a1, a2, a3) -> Int #

(Hashable1 f, Hashable1 g, Hashable a) => Hashable (Product f g a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Product f g a -> Int #

hash :: Product f g a -> Int #

(Hashable1 f, Hashable1 g, Hashable a) => Hashable (Sum f g a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Sum f g a -> Int #

hash :: Sum f g a -> Int #

(Hashable a1, Hashable a2, Hashable a3, Hashable a4) => Hashable (a1, a2, a3, a4) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> (a1, a2, a3, a4) -> Int #

hash :: (a1, a2, a3, a4) -> Int #

(Hashable1 f, Hashable1 g, Hashable a) => Hashable (Compose f g a)

In general, hash (Compose x) ≠ hash x. However, hashWithSalt satisfies its variant of this equivalence.

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Compose f g a -> Int #

hash :: Compose f g a -> Int #

(Hashable a1, Hashable a2, Hashable a3, Hashable a4, Hashable a5) => Hashable (a1, a2, a3, a4, a5) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> (a1, a2, a3, a4, a5) -> Int #

hash :: (a1, a2, a3, a4, a5) -> Int #

(Hashable a1, Hashable a2, Hashable a3, Hashable a4, Hashable a5, Hashable a6) => Hashable (a1, a2, a3, a4, a5, a6) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> (a1, a2, a3, a4, a5, a6) -> Int #

hash :: (a1, a2, a3, a4, a5, a6) -> Int #

(Hashable a1, Hashable a2, Hashable a3, Hashable a4, Hashable a5, Hashable a6, Hashable a7) => Hashable (a1, a2, a3, a4, a5, a6, a7) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> (a1, a2, a3, a4, a5, a6, a7) -> Int #

hash :: (a1, a2, a3, a4, a5, a6, a7) -> Int #

(<$>) :: Functor f => (a -> b) -> f a -> f b infixl 4 #

An infix synonym for fmap.

The name of this operator is an allusion to $. Note the similarities between their types:

 ($)  ::              (a -> b) ->   a ->   b
(<$>) :: Functor f => (a -> b) -> f a -> f b

Whereas $ is function application, <$> is function application lifted over a Functor.

Examples

Expand

Convert from a Maybe Int to a Maybe String using show:

>>> show <$> Nothing
Nothing
>>> show <$> Just 3
Just "3"

Convert from an Either Int Int to an Either Int String using show:

>>> show <$> Left 17
Left 17
>>> show <$> Right 17
Right "17"

Double each element of a list:

>>> (*2) <$> [1,2,3]
[2,4,6]

Apply even to the second element of a pair:

>>> even <$> (2,2)
(2,True)

data Text #

A space efficient, packed, unboxed Unicode text type.

Instances

Instances details
FromJSON Text 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Text 
Instance details

Defined in Data.Aeson.Types.FromJSON

KeyValue Object

Constructs a singleton HashMap. For calling functions that demand an Object for constructing objects. To be used in conjunction with mconcat. Prefer to use object where possible.

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 #

ToJSON Text 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Text 
Instance details

Defined in Data.Aeson.Types.ToJSON

Chunk Text 
Instance details

Defined in Data.Attoparsec.Internal.Types

Associated Types

type ChunkElem Text #

ToMarkup Text 
Instance details

Defined in Text.Blaze

ToValue Text 
Instance details

Defined in Text.Blaze

FoldCase Text 
Instance details

Defined in Data.CaseInsensitive.Internal

Methods

foldCase :: Text -> Text #

foldCaseList :: [Text] -> [Text]

SqlString Text

Since: esqueleto-2.3.0

Instance details

Defined in Database.Esqueleto.Internal.Internal

ToLogStr Text 
Instance details

Defined in System.Log.FastLogger.LogStr

Methods

toLogStr :: Text -> LogStr #

Hashable Text 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Text -> Int #

hash :: Text -> Int #

FromHttpApiData Text 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Text 
Instance details

Defined in Web.Internal.HttpApiData

QueryKeyLike Text 
Instance details

Defined in Network.HTTP.Types.QueryLike

QueryValueLike Text 
Instance details

Defined in Network.HTTP.Types.QueryLike

ToObject Object 
Instance details

Defined in Katip.Core

Methods

toObject :: Object -> Object #

MonoZip Text 
Instance details

Defined in Data.Containers

GrowingAppend Text 
Instance details

Defined in Data.MonoTraversable

MonoFoldable Text 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element Text -> m) -> Text -> m #

ofoldr :: (Element Text -> b -> b) -> b -> Text -> b #

ofoldl' :: (a -> Element Text -> a) -> a -> Text -> a #

otoList :: Text -> [Element Text] #

oall :: (Element Text -> Bool) -> Text -> Bool #

oany :: (Element Text -> Bool) -> Text -> Bool #

onull :: Text -> Bool #

olength :: Text -> Int #

olength64 :: Text -> Int64 #

ocompareLength :: Integral i => Text -> i -> Ordering #

otraverse_ :: Applicative f => (Element Text -> f b) -> Text -> f () #

ofor_ :: Applicative f => Text -> (Element Text -> f b) -> f () #

omapM_ :: Applicative m => (Element Text -> m ()) -> Text -> m () #

oforM_ :: Applicative m => Text -> (Element Text -> m ()) -> m () #

ofoldlM :: Monad m => (a -> Element Text -> m a) -> a -> Text -> m a #

ofoldMap1Ex :: Semigroup m => (Element Text -> m) -> Text -> m #

ofoldr1Ex :: (Element Text -> Element Text -> Element Text) -> Text -> Element Text #

ofoldl1Ex' :: (Element Text -> Element Text -> Element Text) -> Text -> Element Text #

headEx :: Text -> Element Text #

lastEx :: Text -> Element Text #

unsafeHead :: Text -> Element Text #

unsafeLast :: Text -> Element Text #

maximumByEx :: (Element Text -> Element Text -> Ordering) -> Text -> Element Text #

minimumByEx :: (Element Text -> Element Text -> Ordering) -> Text -> Element Text #

oelem :: Element Text -> Text -> Bool #

onotElem :: Element Text -> Text -> Bool #

MonoFunctor Text 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element Text -> Element Text) -> Text -> Text #

MonoPointed Text 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element Text -> Text #

MonoTraversable Text 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element Text -> f (Element Text)) -> Text -> f Text #

omapM :: Applicative m => (Element Text -> m (Element Text)) -> Text -> m Text #

IsSequence Text 
Instance details

Defined in Data.Sequences

Methods

fromList :: [Element Text] -> Text #

lengthIndex :: Text -> Index Text #

break :: (Element Text -> Bool) -> Text -> (Text, Text) #

span :: (Element Text -> Bool) -> Text -> (Text, Text) #

dropWhile :: (Element Text -> Bool) -> Text -> Text #

takeWhile :: (Element Text -> Bool) -> Text -> Text #

splitAt :: Index Text -> Text -> (Text, Text) #

unsafeSplitAt :: Index Text -> Text -> (Text, Text) #

take :: Index Text -> Text -> Text #

unsafeTake :: Index Text -> Text -> Text #

drop :: Index Text -> Text -> Text #

unsafeDrop :: Index Text -> Text -> Text #

dropEnd :: Index Text -> Text -> Text #

partition :: (Element Text -> Bool) -> Text -> (Text, Text) #

uncons :: Text -> Maybe (Element Text, Text) #

unsnoc :: Text -> Maybe (Text, Element Text) #

filter :: (Element Text -> Bool) -> Text -> Text #

filterM :: Monad m => (Element Text -> m Bool) -> Text -> m Text #

replicate :: Index Text -> Element Text -> Text #

replicateM :: Monad m => Index Text -> m (Element Text) -> m Text #

groupBy :: (Element Text -> Element Text -> Bool) -> Text -> [Text] #

groupAllOn :: Eq b => (Element Text -> b) -> Text -> [Text] #

subsequences :: Text -> [Text] #

permutations :: Text -> [Text] #

tailEx :: Text -> Text #

tailMay :: Text -> Maybe Text #

initEx :: Text -> Text #

initMay :: Text -> Maybe Text #

unsafeTail :: Text -> Text #

unsafeInit :: Text -> Text #

index :: Text -> Index Text -> Maybe (Element Text) #

indexEx :: Text -> Index Text -> Element Text #

unsafeIndex :: Text -> Index Text -> Element Text #

splitWhen :: (Element Text -> Bool) -> Text -> [Text] #

SemiSequence Text 
Instance details

Defined in Data.Sequences

Associated Types

type Index Text #

Textual Text 
Instance details

Defined in Data.Sequences

Methods

words :: Text -> [Text] #

unwords :: (Element seq ~ Text, MonoFoldable seq) => seq -> Text #

lines :: Text -> [Text] #

unlines :: (Element seq ~ Text, MonoFoldable seq) => seq -> Text #

toLower :: Text -> Text #

toUpper :: Text -> Text #

toCaseFold :: Text -> Text #

breakWord :: Text -> (Text, Text) #

breakLine :: Text -> (Text, Text) #

PathPiece Text 
Instance details

Defined in Web.PathPieces

PersistField Text 
Instance details

Defined in Database.Persist.Class.PersistField

PersistFieldSql Text 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Text -> SqlType #

Pretty Text

Automatically converts all newlines to line.

>>> pretty ("hello\nworld" :: Text)
hello
world

Note that line can be undone by group:

>>> group (pretty ("hello\nworld" :: Text))
hello world

Manually use hardline if you definitely want newlines.

Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Text -> Doc ann #

prettyList :: [Text] -> Doc ann #

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 #

ToCss Text 
Instance details

Defined in Text.Internal.Css

Methods

toCss :: Text -> Builder #

RawJS Text 
Instance details

Defined in Text.Julius

Methods

rawJS :: Text -> RawJavascript #

ToJavascript Text 
Instance details

Defined in Text.Julius

ToMessage Text 
Instance details

Defined in Text.Shakespeare.I18N

Methods

toMessage :: Text -> Text #

Container Text 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element Text #

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 #

foldMap :: Monoid m => (Element Text -> m) -> Text -> m #

fold :: Text -> Element Text #

foldr' :: (Element Text -> b -> b) -> b -> Text -> b #

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) #

safeMaximum :: Text -> Maybe (Element Text) #

safeMinimum :: Text -> Maybe (Element Text) #

safeFoldr1 :: (Element Text -> Element Text -> Element Text) -> Text -> Maybe (Element Text) #

safeFoldl1 :: (Element Text -> Element Text -> Element Text) -> Text -> Maybe (Element Text) #

FromList Text 
Instance details

Defined in Universum.Container.Class

Associated Types

type ListElement Text #

type FromListC Text #

Methods

fromList :: [ListElement Text] -> Text #

One Text 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem Text #

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 #

HasContentType Text 
Instance details

Defined in Yesod.Core.Content

Methods

getContentType :: Monad m => m Text -> ContentType #

ToContent Text 
Instance details

Defined in Yesod.Core.Content

Methods

toContent :: Text -> Content #

ToFlushBuilder Text 
Instance details

Defined in Yesod.Core.Content

ToTypedContent Text 
Instance details

Defined in Yesod.Core.Content

ToBuilder Text Builder 
Instance details

Defined in Data.Builder

Methods

toBuilder :: Text -> Builder #

ToBuilder Text Builder 
Instance details

Defined in Data.Builder

Methods

toBuilder :: Text -> Builder #

FromGrpc NodeLocation Text 
Instance details

Defined in LndClient.Data.Newtype

Methods

fromGrpc :: Text -> Either LndError NodeLocation

FromGrpc NodePubKey Text 
Instance details

Defined in LndClient.Data.Newtype

FromGrpc PaymentRequest Text 
Instance details

Defined in LndClient.Data.Newtype

Methods

fromGrpc :: Text -> Either LndError PaymentRequest

FromGrpc RHash Text 
Instance details

Defined in LndClient.Data.Newtype

FromGrpc RPreimage Text 
Instance details

Defined in LndClient.Data.Newtype

ToGrpc NodeLocation Text 
Instance details

Defined in LndClient.Data.Newtype

Methods

toGrpc :: NodeLocation -> Either LndError Text

ToGrpc NodePubKey Text 
Instance details

Defined in LndClient.Data.Newtype

ToGrpc PaymentRequest Text 
Instance details

Defined in LndClient.Data.Newtype

Methods

toGrpc :: PaymentRequest -> Either LndError Text

LazySequence Text Text 
Instance details

Defined in Data.Sequences

Utf8 Text ByteString 
Instance details

Defined in Data.Sequences

RenderMessage master Text 
Instance details

Defined in Text.Shakespeare.I18N

Methods

renderMessage :: master -> [Lang] -> Text -> 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 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 -> 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 Text 
Instance details

Defined in Data.String.Conv

Methods

strConv :: Leniency -> Text -> Text0 #

StringConv String Text 
Instance details

Defined in Data.String.Conv

Methods

strConv :: Leniency -> String -> Text #

ConvertUtf8 Text ByteString 
Instance details

Defined in Universum.String.Conversion

ConvertUtf8 Text ByteString 
Instance details

Defined in Universum.String.Conversion

From BlkHash BlockHash Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: BlkHash -> BlockHash

From NodePubKeyHex Text Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: NodePubKeyHex -> Text

From NodeUriHex Text Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: NodeUriHex -> Text

From RHashHex Text Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: RHashHex -> Text

From SigHeaderName Text Source # 
Instance details

Defined in BtcLsp.Grpc.Data

Methods

from :: SigHeaderName -> Text

From PaymentRequest Text Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Methods

from :: PaymentRequest -> Text

From BlockHash BlkHash Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: BlockHash -> BlkHash

From Text NodePubKeyHex Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Text -> NodePubKeyHex

From Text NodeUriHex Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Text -> NodeUriHex

From Text RHashHex Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Text -> RHashHex

From Text SigHeaderName Source # 
Instance details

Defined in BtcLsp.Grpc.Data

Methods

from :: Text -> SigHeaderName

From Text PaymentRequest Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Methods

from :: Text -> PaymentRequest

RedirectUrl master Text 
Instance details

Defined in Yesod.Core.Handler

Methods

toTextUrl :: (MonadHandler m, HandlerSite m ~ master) => Text -> m Text #

ToWidget site Text

Since: yesod-core-1.4.28

Instance details

Defined in Yesod.Core.Widget

Methods

toWidget :: (MonadWidget m, HandlerSite m ~ site) => Text -> m () #

HasField InternalFailure "grpcServer" Text 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

fieldOf :: Functor f => Proxy# "grpcServer" -> (Text -> f Text) -> InternalFailure -> f InternalFailure

HasField InternalFailure "math" Text 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

fieldOf :: Functor f => Proxy# "math" -> (Text -> f Text) -> InternalFailure -> f InternalFailure

HasField LnHost "val" Text 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

fieldOf :: Functor f => Proxy# "val" -> (Text -> f Text) -> LnHost -> f LnHost

HasField LnHodlInvoice "val" Text 
Instance details

Defined in Proto.BtcLsp.Data.LowLevel

Methods

fieldOf :: Functor f => Proxy# "val" -> (Text -> f Text) -> LnHodlInvoice -> f LnHodlInvoice

HasField LnInvoice "val" Text 
Instance details

Defined in Proto.BtcLsp.Data.LowLevel

Methods

fieldOf :: Functor f => Proxy# "val" -> (Text -> f Text) -> LnInvoice -> f LnInvoice

HasField OnChainAddress "val" Text 
Instance details

Defined in Proto.BtcLsp.Data.LowLevel

Methods

fieldOf :: Functor f => Proxy# "val" -> (Text -> f Text) -> OnChainAddress -> f OnChainAddress

HasField AddHoldInvoiceRequest "fallbackAddr" Text 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

fieldOf :: Functor f => Proxy# "fallbackAddr" -> (Text -> f Text) -> AddHoldInvoiceRequest -> f AddHoldInvoiceRequest

HasField AddHoldInvoiceRequest "memo" Text 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

fieldOf :: Functor f => Proxy# "memo" -> (Text -> f Text) -> AddHoldInvoiceRequest -> f AddHoldInvoiceRequest

HasField AddHoldInvoiceResp "paymentRequest" Text 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

fieldOf :: Functor f => Proxy# "paymentRequest" -> (Text -> f Text) -> AddHoldInvoiceResp -> f AddHoldInvoiceResp

HasField BatchOpenChannel "closeAddress" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "closeAddress" -> (Text -> f Text) -> BatchOpenChannel -> f BatchOpenChannel

HasField BatchOpenChannelRequest "label" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "label" -> (Text -> f Text) -> BatchOpenChannelRequest -> f BatchOpenChannelRequest

HasField Chain "chain" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "chain" -> (Text -> f Text) -> Chain -> f Chain

HasField Chain "network" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "network" -> (Text -> f Text) -> Chain -> f Chain

HasField ChannelAcceptResponse "error" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "error" -> (Text -> f Text) -> ChannelAcceptResponse -> f ChannelAcceptResponse

HasField ChannelAcceptResponse "upfrontShutdown" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "upfrontShutdown" -> (Text -> f Text) -> ChannelAcceptResponse -> f ChannelAcceptResponse

HasField CloseChannelRequest "deliveryAddress" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "deliveryAddress" -> (Text -> f Text) -> CloseChannelRequest -> f CloseChannelRequest

HasField DisconnectPeerRequest "pubKey" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "pubKey" -> (Text -> f Text) -> DisconnectPeerRequest -> f DisconnectPeerRequest

HasField EstimateFeeRequest'AddrToAmountEntry "key" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "key" -> (Text -> f Text) -> EstimateFeeRequest'AddrToAmountEntry -> f EstimateFeeRequest'AddrToAmountEntry

HasField GetInfoResponse "alias" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "alias" -> (Text -> f Text) -> GetInfoResponse -> f GetInfoResponse

HasField GetInfoResponse "blockHash" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "blockHash" -> (Text -> f Text) -> GetInfoResponse -> f GetInfoResponse

HasField GetInfoResponse "color" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "color" -> (Text -> f Text) -> GetInfoResponse -> f GetInfoResponse

HasField GetInfoResponse "commitHash" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "commitHash" -> (Text -> f Text) -> GetInfoResponse -> f GetInfoResponse

HasField GetInfoResponse "identityPubkey" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "identityPubkey" -> (Text -> f Text) -> GetInfoResponse -> f GetInfoResponse

HasField GetInfoResponse "version" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "version" -> (Text -> f Text) -> GetInfoResponse -> f GetInfoResponse

HasField GetTransactionsRequest "account" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "account" -> (Text -> f Text) -> GetTransactionsRequest -> f GetTransactionsRequest

HasField LightningAddress "host" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "host" -> (Text -> f Text) -> LightningAddress -> f LightningAddress

HasField LightningAddress "pubkey" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "pubkey" -> (Text -> f Text) -> LightningAddress -> f LightningAddress

HasField ListUnspentRequest "account" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "account" -> (Text -> f Text) -> ListUnspentRequest -> f ListUnspentRequest

HasField NewAddressRequest "account" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "account" -> (Text -> f Text) -> NewAddressRequest -> f NewAddressRequest

HasField NewAddressResponse "address" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "address" -> (Text -> f Text) -> NewAddressResponse -> f NewAddressResponse

HasField OpenChannelRequest "closeAddress" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "closeAddress" -> (Text -> f Text) -> OpenChannelRequest -> f OpenChannelRequest

HasField OpenChannelRequest "nodePubkeyString" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "nodePubkeyString" -> (Text -> f Text) -> OpenChannelRequest -> f OpenChannelRequest

HasField Peer "address" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "address" -> (Text -> f Text) -> Peer -> f Peer

HasField Peer "pubKey" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "pubKey" -> (Text -> f Text) -> Peer -> f Peer

HasField PeerEvent "pubKey" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "pubKey" -> (Text -> f Text) -> PeerEvent -> f PeerEvent

HasField ReadyForPsbtFunding "fundingAddress" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "fundingAddress" -> (Text -> f Text) -> ReadyForPsbtFunding -> f ReadyForPsbtFunding

HasField SendCoinsRequest "addr" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "addr" -> (Text -> f Text) -> SendCoinsRequest -> f SendCoinsRequest

HasField SendCoinsRequest "label" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "label" -> (Text -> f Text) -> SendCoinsRequest -> f SendCoinsRequest

HasField SendCoinsResponse "txid" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "txid" -> (Text -> f Text) -> SendCoinsResponse -> f SendCoinsResponse

HasField SendManyRequest "label" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "label" -> (Text -> f Text) -> SendManyRequest -> f SendManyRequest

HasField SendManyRequest'AddrToAmountEntry "key" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "key" -> (Text -> f Text) -> SendManyRequest'AddrToAmountEntry -> f SendManyRequest'AddrToAmountEntry

HasField SendManyResponse "txid" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "txid" -> (Text -> f Text) -> SendManyResponse -> f SendManyResponse

HasField SendRequest "destString" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "destString" -> (Text -> f Text) -> SendRequest -> f SendRequest

HasField SendRequest "paymentHashString" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "paymentHashString" -> (Text -> f Text) -> SendRequest -> f SendRequest

HasField SendRequest "paymentRequest" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "paymentRequest" -> (Text -> f Text) -> SendRequest -> f SendRequest

HasField SendResponse "paymentError" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "paymentError" -> (Text -> f Text) -> SendResponse -> f SendResponse

HasField SendToRouteRequest "paymentHashString" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "paymentHashString" -> (Text -> f Text) -> SendToRouteRequest -> f SendToRouteRequest

HasField SignMessageResponse "signature" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "signature" -> (Text -> f Text) -> SignMessageResponse -> f SignMessageResponse

HasField TimestampedError "error" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "error" -> (Text -> f Text) -> TimestampedError -> f TimestampedError

HasField Transaction "blockHash" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "blockHash" -> (Text -> f Text) -> Transaction -> f Transaction

HasField Transaction "label" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "label" -> (Text -> f Text) -> Transaction -> f Transaction

HasField Transaction "rawTxHex" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "rawTxHex" -> (Text -> f Text) -> Transaction -> f Transaction

HasField Transaction "txHash" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "txHash" -> (Text -> f Text) -> Transaction -> f Transaction

HasField Utxo "address" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "address" -> (Text -> f Text) -> Utxo -> f Utxo

HasField Utxo "pkScript" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "pkScript" -> (Text -> f Text) -> Utxo -> f Utxo

HasField VerifyMessageRequest "signature" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "signature" -> (Text -> f Text) -> VerifyMessageRequest -> f VerifyMessageRequest

HasField VerifyMessageResponse "pubkey" Text 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "pubkey" -> (Text -> f Text) -> VerifyMessageResponse -> f VerifyMessageResponse

HasField Channel "chanStatusFlags" Text 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "chanStatusFlags" -> (Text -> f Text) -> Channel -> f Channel

HasField Channel "channelPoint" Text 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "channelPoint" -> (Text -> f Text) -> Channel -> f Channel

HasField Channel "closeAddress" Text 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "closeAddress" -> (Text -> f Text) -> Channel -> f Channel

HasField Channel "remotePubkey" Text 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "remotePubkey" -> (Text -> f Text) -> Channel -> f Channel

HasField ChannelCloseSummary "chainHash" Text 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "chainHash" -> (Text -> f Text) -> ChannelCloseSummary -> f ChannelCloseSummary

HasField ChannelCloseSummary "channelPoint" Text 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "channelPoint" -> (Text -> f Text) -> ChannelCloseSummary -> f ChannelCloseSummary

HasField ChannelCloseSummary "closingTxHash" Text 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "closingTxHash" -> (Text -> f Text) -> ChannelCloseSummary -> f ChannelCloseSummary

HasField ChannelCloseSummary "remotePubkey" Text 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "remotePubkey" -> (Text -> f Text) -> ChannelCloseSummary -> f ChannelCloseSummary

HasField ChannelEdge "chanPoint" Text 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "chanPoint" -> (Text -> f Text) -> ChannelEdge -> f ChannelEdge

HasField ChannelEdge "node1Pub" Text 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "node1Pub" -> (Text -> f Text) -> ChannelEdge -> f ChannelEdge

HasField ChannelEdge "node2Pub" Text 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "node2Pub" -> (Text -> f Text) -> ChannelEdge -> f ChannelEdge

HasField ChannelEdgeUpdate "advertisingNode" Text 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "advertisingNode" -> (Text -> f Text) -> ChannelEdgeUpdate -> f ChannelEdgeUpdate

HasField ChannelEdgeUpdate "connectingNode" Text 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "connectingNode" -> (Text -> f Text) -> ChannelEdgeUpdate -> f ChannelEdgeUpdate

HasField ChannelPoint "fundingTxidStr" Text 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "fundingTxidStr" -> (Text -> f Text) -> ChannelPoint -> f ChannelPoint

HasField Feature "name" Text 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "name" -> (Text -> f Text) -> Feature -> f Feature

HasField Hop "pubKey" Text 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "pubKey" -> (Text -> f Text) -> Hop -> f Hop

HasField HopHint "nodeId" Text 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "nodeId" -> (Text -> f Text) -> HopHint -> f HopHint

HasField LightningNode "alias" Text 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "alias" -> (Text -> f Text) -> LightningNode -> f LightningNode

HasField LightningNode "color" Text 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "color" -> (Text -> f Text) -> LightningNode -> f LightningNode

HasField LightningNode "pubKey" Text 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "pubKey" -> (Text -> f Text) -> LightningNode -> f LightningNode

HasField NodeAddress "addr" Text 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "addr" -> (Text -> f Text) -> NodeAddress -> f NodeAddress

HasField NodeAddress "network" Text 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "network" -> (Text -> f Text) -> NodeAddress -> f NodeAddress

HasField NodeInfoRequest "pubKey" Text 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "pubKey" -> (Text -> f Text) -> NodeInfoRequest -> f NodeInfoRequest

HasField NodeMetricsResponse'BetweennessCentralityEntry "key" Text 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "key" -> (Text -> f Text) -> NodeMetricsResponse'BetweennessCentralityEntry -> f NodeMetricsResponse'BetweennessCentralityEntry

HasField NodeUpdate "alias" Text 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "alias" -> (Text -> f Text) -> NodeUpdate -> f NodeUpdate

HasField NodeUpdate "color" Text 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "color" -> (Text -> f Text) -> NodeUpdate -> f NodeUpdate

HasField NodeUpdate "identityKey" Text 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "identityKey" -> (Text -> f Text) -> NodeUpdate -> f NodeUpdate

HasField OutPoint "txidStr" Text 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "txidStr" -> (Text -> f Text) -> OutPoint -> f OutPoint

HasField PendingChannelsResponse'ClosedChannel "closingTxid" Text 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "closingTxid" -> (Text -> f Text) -> PendingChannelsResponse'ClosedChannel -> f PendingChannelsResponse'ClosedChannel

HasField PendingChannelsResponse'Commitments "localTxid" Text 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "localTxid" -> (Text -> f Text) -> PendingChannelsResponse'Commitments -> f PendingChannelsResponse'Commitments

HasField PendingChannelsResponse'Commitments "remotePendingTxid" Text 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "remotePendingTxid" -> (Text -> f Text) -> PendingChannelsResponse'Commitments -> f PendingChannelsResponse'Commitments

HasField PendingChannelsResponse'Commitments "remoteTxid" Text 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "remoteTxid" -> (Text -> f Text) -> PendingChannelsResponse'Commitments -> f PendingChannelsResponse'Commitments

HasField PendingChannelsResponse'ForceClosedChannel "closingTxid" Text 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "closingTxid" -> (Text -> f Text) -> PendingChannelsResponse'ForceClosedChannel -> f PendingChannelsResponse'ForceClosedChannel

HasField PendingChannelsResponse'PendingChannel "channelPoint" Text 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "channelPoint" -> (Text -> f Text) -> PendingChannelsResponse'PendingChannel -> f PendingChannelsResponse'PendingChannel

HasField PendingChannelsResponse'PendingChannel "remoteNodePub" Text 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "remoteNodePub" -> (Text -> f Text) -> PendingChannelsResponse'PendingChannel -> f PendingChannelsResponse'PendingChannel

HasField PendingHTLC "outpoint" Text 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "outpoint" -> (Text -> f Text) -> PendingHTLC -> f PendingHTLC

HasField QueryRoutesRequest "pubKey" Text 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "pubKey" -> (Text -> f Text) -> QueryRoutesRequest -> f QueryRoutesRequest

HasField QueryRoutesRequest "sourcePubKey" Text 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "sourcePubKey" -> (Text -> f Text) -> QueryRoutesRequest -> f QueryRoutesRequest

HasField Resolution "sweepTxid" Text 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "sweepTxid" -> (Text -> f Text) -> Resolution -> f Resolution

HasField WalletBalanceResponse'AccountBalanceEntry "key" Text 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "key" -> (Text -> f Text) -> WalletBalanceResponse'AccountBalanceEntry -> f WalletBalanceResponse'AccountBalanceEntry

HasField AddInvoiceResponse "paymentRequest" Text 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "paymentRequest" -> (Text -> f Text) -> AddInvoiceResponse -> f AddInvoiceResponse

HasField BakeMacaroonResponse "macaroon" Text 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "macaroon" -> (Text -> f Text) -> BakeMacaroonResponse -> f BakeMacaroonResponse

HasField ChannelFeeReport "channelPoint" Text 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "channelPoint" -> (Text -> f Text) -> ChannelFeeReport -> f ChannelFeeReport

HasField CheckMacPermRequest "fullMethod" Text 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "fullMethod" -> (Text -> f Text) -> CheckMacPermRequest -> f CheckMacPermRequest

HasField DebugLevelRequest "levelSpec" Text 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "levelSpec" -> (Text -> f Text) -> DebugLevelRequest -> f DebugLevelRequest

HasField DebugLevelResponse "subSystems" Text 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "subSystems" -> (Text -> f Text) -> DebugLevelResponse -> f DebugLevelResponse

HasField FailedUpdate "updateError" Text 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "updateError" -> (Text -> f Text) -> FailedUpdate -> f FailedUpdate

HasField InterceptFeedback "error" Text 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "error" -> (Text -> f Text) -> InterceptFeedback -> f InterceptFeedback

HasField Invoice "fallbackAddr" Text 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "fallbackAddr" -> (Text -> f Text) -> Invoice -> f Invoice

HasField Invoice "memo" Text 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "memo" -> (Text -> f Text) -> Invoice -> f Invoice

HasField Invoice "paymentRequest" Text 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "paymentRequest" -> (Text -> f Text) -> Invoice -> f Invoice

HasField Invoice'AmpInvoiceStateEntry "key" Text 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "key" -> (Text -> f Text) -> Invoice'AmpInvoiceStateEntry -> f Invoice'AmpInvoiceStateEntry

HasField ListPermissionsResponse'MethodPermissionsEntry "key" Text 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "key" -> (Text -> f Text) -> ListPermissionsResponse'MethodPermissionsEntry -> f ListPermissionsResponse'MethodPermissionsEntry

HasField MacaroonPermission "action" Text 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "action" -> (Text -> f Text) -> MacaroonPermission -> f MacaroonPermission

HasField MacaroonPermission "entity" Text 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "entity" -> (Text -> f Text) -> MacaroonPermission -> f MacaroonPermission

HasField MiddlewareRegistration "customMacaroonCaveatName" Text 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "customMacaroonCaveatName" -> (Text -> f Text) -> MiddlewareRegistration -> f MiddlewareRegistration

HasField MiddlewareRegistration "middlewareName" Text 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "middlewareName" -> (Text -> f Text) -> MiddlewareRegistration -> f MiddlewareRegistration

HasField Op "entity" Text 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "entity" -> (Text -> f Text) -> Op -> f Op

HasField PayReq "description" Text 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "description" -> (Text -> f Text) -> PayReq -> f PayReq

HasField PayReq "descriptionHash" Text 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "descriptionHash" -> (Text -> f Text) -> PayReq -> f PayReq

HasField PayReq "destination" Text 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "destination" -> (Text -> f Text) -> PayReq -> f PayReq

HasField PayReq "fallbackAddr" Text 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "fallbackAddr" -> (Text -> f Text) -> PayReq -> f PayReq

HasField PayReq "paymentHash" Text 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "paymentHash" -> (Text -> f Text) -> PayReq -> f PayReq

HasField PayReqString "payReq" Text 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "payReq" -> (Text -> f Text) -> PayReqString -> f PayReqString

HasField Payment "paymentHash" Text 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "paymentHash" -> (Text -> f Text) -> Payment -> f Payment

HasField Payment "paymentPreimage" Text 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "paymentPreimage" -> (Text -> f Text) -> Payment -> f Payment

HasField Payment "paymentRequest" Text 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "paymentRequest" -> (Text -> f Text) -> Payment -> f Payment

HasField PaymentHash "rHashStr" Text 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "rHashStr" -> (Text -> f Text) -> PaymentHash -> f PaymentHash

HasField RPCMessage "methodFullUri" Text 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "methodFullUri" -> (Text -> f Text) -> RPCMessage -> f RPCMessage

HasField RPCMessage "typeName" Text 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "typeName" -> (Text -> f Text) -> RPCMessage -> f RPCMessage

HasField RPCMiddlewareRequest "customCaveatCondition" Text 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "customCaveatCondition" -> (Text -> f Text) -> RPCMiddlewareRequest -> f RPCMiddlewareRequest

HasField StreamAuth "methodFullUri" Text 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "methodFullUri" -> (Text -> f Text) -> StreamAuth -> f StreamAuth

HasField LinkFailEvent "failureString" Text 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "failureString" -> (Text -> f Text) -> LinkFailEvent -> f LinkFailEvent

HasField SendPaymentRequest "paymentRequest" Text 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "paymentRequest" -> (Text -> f Text) -> SendPaymentRequest -> f SendPaymentRequest

HasField Account "derivationPath" Text 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "derivationPath" -> (Text -> f Text) -> Account -> f Account

HasField Account "extendedPublicKey" Text 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "extendedPublicKey" -> (Text -> f Text) -> Account -> f Account

HasField Account "name" Text 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "name" -> (Text -> f Text) -> Account -> f Account

HasField AddrRequest "account" Text 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "account" -> (Text -> f Text) -> AddrRequest -> f AddrRequest

HasField AddrResponse "addr" Text 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "addr" -> (Text -> f Text) -> AddrResponse -> f AddrResponse

HasField FinalizePsbtRequest "account" Text 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "account" -> (Text -> f Text) -> FinalizePsbtRequest -> f FinalizePsbtRequest

HasField FundPsbtRequest "account" Text 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "account" -> (Text -> f Text) -> FundPsbtRequest -> f FundPsbtRequest

HasField ImportAccountRequest "extendedPublicKey" Text 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "extendedPublicKey" -> (Text -> f Text) -> ImportAccountRequest -> f ImportAccountRequest

HasField ImportAccountRequest "name" Text 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "name" -> (Text -> f Text) -> ImportAccountRequest -> f ImportAccountRequest

HasField LabelTransactionRequest "label" Text 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "label" -> (Text -> f Text) -> LabelTransactionRequest -> f LabelTransactionRequest

HasField ListAccountsRequest "name" Text 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "name" -> (Text -> f Text) -> ListAccountsRequest -> f ListAccountsRequest

HasField ListUnspentRequest "account" Text 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "account" -> (Text -> f Text) -> ListUnspentRequest -> f ListUnspentRequest

HasField PublishResponse "publishError" Text 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "publishError" -> (Text -> f Text) -> PublishResponse -> f PublishResponse

HasField SendOutputsRequest "label" Text 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "label" -> (Text -> f Text) -> SendOutputsRequest -> f SendOutputsRequest

HasField Transaction "label" Text 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "label" -> (Text -> f Text) -> Transaction -> f Transaction

HasField TxTemplate'OutputsEntry "key" Text 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "key" -> (Text -> f Text) -> TxTemplate'OutputsEntry -> f TxTemplate'OutputsEntry

HasField InitWalletRequest "extendedMasterKey" Text 
Instance details

Defined in Proto.Walletunlocker

Methods

fieldOf :: Functor f => Proxy# "extendedMasterKey" -> (Text -> f Text) -> InitWalletRequest -> f InitWalletRequest

HasField WatchOnlyAccount "xpub" Text 
Instance details

Defined in Proto.Walletunlocker

Methods

fieldOf :: Functor f => Proxy# "xpub" -> (Text -> f Text) -> WatchOnlyAccount -> f WatchOnlyAccount

HasField InternalFailure "maybe'grpcServer" (Maybe Text) 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

fieldOf :: Functor f => Proxy# "maybe'grpcServer" -> (Maybe Text -> f (Maybe Text)) -> InternalFailure -> f InternalFailure

HasField InternalFailure "maybe'math" (Maybe Text) 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

fieldOf :: Functor f => Proxy# "maybe'math" -> (Maybe Text -> f (Maybe Text)) -> InternalFailure -> f InternalFailure

HasField GetInfoResponse "uris" [Text] 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "uris" -> ([Text] -> f [Text]) -> GetInfoResponse -> f GetInfoResponse

HasField GetInfoResponse "vec'uris" (Vector Text) 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "vec'uris" -> (Vector Text -> f (Vector Text)) -> GetInfoResponse -> f GetInfoResponse

HasField Transaction "destAddresses" [Text] 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "destAddresses" -> ([Text] -> f [Text]) -> Transaction -> f Transaction

HasField Transaction "vec'destAddresses" (Vector Text) 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "vec'destAddresses" -> (Vector Text -> f (Vector Text)) -> Transaction -> f Transaction

HasField ChannelPoint "maybe'fundingTxidStr" (Maybe Text) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "maybe'fundingTxidStr" -> (Maybe Text -> f (Maybe Text)) -> ChannelPoint -> f ChannelPoint

HasField NodeUpdate "addresses" [Text] 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "addresses" -> ([Text] -> f [Text]) -> NodeUpdate -> f NodeUpdate

HasField NodeUpdate "vec'addresses" (Vector Text) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "vec'addresses" -> (Vector Text -> f (Vector Text)) -> NodeUpdate -> f NodeUpdate

HasField Op "actions" [Text] 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "actions" -> ([Text] -> f [Text]) -> Op -> f Op

HasField Op "vec'actions" (Vector Text) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "vec'actions" -> (Vector Text -> f (Vector Text)) -> Op -> f Op

HasField ImportAccountResponse "dryRunExternalAddrs" [Text] 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "dryRunExternalAddrs" -> ([Text] -> f [Text]) -> ImportAccountResponse -> f ImportAccountResponse

HasField ImportAccountResponse "dryRunInternalAddrs" [Text] 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "dryRunInternalAddrs" -> ([Text] -> f [Text]) -> ImportAccountResponse -> f ImportAccountResponse

HasField ImportAccountResponse "vec'dryRunExternalAddrs" (Vector Text) 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "vec'dryRunExternalAddrs" -> (Vector Text -> f (Vector Text)) -> ImportAccountResponse -> f ImportAccountResponse

HasField ImportAccountResponse "vec'dryRunInternalAddrs" (Vector Text) 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "vec'dryRunInternalAddrs" -> (Vector Text -> f (Vector Text)) -> ImportAccountResponse -> f ImportAccountResponse

HasField ListSweepsResponse'TransactionIDs "transactionIds" [Text] 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "transactionIds" -> ([Text] -> f [Text]) -> ListSweepsResponse'TransactionIDs -> f ListSweepsResponse'TransactionIDs

HasField ListSweepsResponse'TransactionIDs "vec'transactionIds" (Vector Text) 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "vec'transactionIds" -> (Vector Text -> f (Vector Text)) -> ListSweepsResponse'TransactionIDs -> f ListSweepsResponse'TransactionIDs

HasField GenSeedResponse "cipherSeedMnemonic" [Text] 
Instance details

Defined in Proto.Walletunlocker

Methods

fieldOf :: Functor f => Proxy# "cipherSeedMnemonic" -> ([Text] -> f [Text]) -> GenSeedResponse -> f GenSeedResponse

HasField GenSeedResponse "vec'cipherSeedMnemonic" (Vector Text) 
Instance details

Defined in Proto.Walletunlocker

Methods

fieldOf :: Functor f => Proxy# "vec'cipherSeedMnemonic" -> (Vector Text -> f (Vector Text)) -> GenSeedResponse -> f GenSeedResponse

HasField InitWalletRequest "cipherSeedMnemonic" [Text] 
Instance details

Defined in Proto.Walletunlocker

Methods

fieldOf :: Functor f => Proxy# "cipherSeedMnemonic" -> ([Text] -> f [Text]) -> InitWalletRequest -> f InitWalletRequest

HasField InitWalletRequest "vec'cipherSeedMnemonic" (Vector Text) 
Instance details

Defined in Proto.Walletunlocker

Methods

fieldOf :: Functor f => Proxy# "vec'cipherSeedMnemonic" -> (Vector Text -> f (Vector Text)) -> InitWalletRequest -> f InitWalletRequest

HasField EstimateFeeRequest "addrToAmount" (Map Text Int64) 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "addrToAmount" -> (Map Text Int64 -> f (Map Text Int64)) -> EstimateFeeRequest -> f EstimateFeeRequest

HasField SendManyRequest "addrToAmount" (Map Text Int64) 
Instance details

Defined in Proto.Lightning

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.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "betweennessCentrality" -> (Map Text FloatMetric -> f (Map Text FloatMetric)) -> NodeMetricsResponse -> f NodeMetricsResponse

HasField WalletBalanceResponse "accountBalance" (Map Text WalletAccountBalance) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "accountBalance" -> (Map Text WalletAccountBalance -> f (Map Text WalletAccountBalance)) -> WalletBalanceResponse -> f WalletBalanceResponse

HasField Invoice "ampInvoiceState" (Map Text AMPInvoiceState) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "ampInvoiceState" -> (Map Text AMPInvoiceState -> f (Map Text AMPInvoiceState)) -> Invoice -> f Invoice

HasField ListPermissionsResponse "methodPermissions" (Map Text MacaroonPermissionList) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "methodPermissions" -> (Map Text MacaroonPermissionList -> f (Map Text MacaroonPermissionList)) -> ListPermissionsResponse -> f ListPermissionsResponse

HasField TxTemplate "outputs" (Map Text Word64) 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "outputs" -> (Map Text Word64 -> f (Map Text Word64)) -> TxTemplate -> f TxTemplate

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] 
Instance details

Defined in LndClient.Data.Newtype

Methods

toGrpc :: CipherSeedMnemonic -> Either LndError [Text]

From Text (LnInvoice mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Text -> LnInvoice mrel

From Text (UnsafeOnChainAddress mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Text -> UnsafeOnChainAddress mrel

ToAttributes [(Text, Text)] 
Instance details

Defined in Text.Hamlet

Methods

toAttributes :: [(Text, Text)] -> [(Text, Text)] #

ToFlushBuilder (Flush Text) 
Instance details

Defined in Yesod.Core.Content

FromGrpc (TxId a) Text 
Instance details

Defined in LndClient.Data.Newtype

Methods

fromGrpc :: Text -> Either LndError (TxId a)

From (OnChainAddress mrel) Text Source # 
Instance details

Defined in BtcLsp.Data.Smart

Methods

from :: OnChainAddress mrel -> Text

From (LnInvoice mrel) Text Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: LnInvoice mrel -> Text

From (UnsafeOnChainAddress mrel) Text Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: UnsafeOnChainAddress mrel -> Text

PersistField v => PersistField (Map Text v) 
Instance details

Defined in Database.Persist.Class.PersistField

PersistFieldSql v => PersistFieldSql (Map Text v) 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy (Map Text v) -> SqlType #

ToAttributes (Text, Text) 
Instance details

Defined in Text.Hamlet

Methods

toAttributes :: (Text, Text) -> [(Text, Text)] #

type ChunkElem Text 
Instance details

Defined in Data.Attoparsec.Internal.Types

type State Text 
Instance details

Defined in Data.Attoparsec.Internal.Types

type State Text = Buffer
type Item Text 
Instance details

Defined in Data.Text

type Item Text = Char
type Element Text 
Instance details

Defined in Data.MonoTraversable

type Index Text 
Instance details

Defined in Data.Sequences

type Index Text = Int
type Element Text 
Instance details

Defined in Universum.Container.Class

type FromListC Text 
Instance details

Defined in Universum.Container.Class

type FromListC Text = ()
type ListElement Text 
Instance details

Defined in Universum.Container.Class

type OneItem Text 
Instance details

Defined in Universum.Container.Class

const :: a -> b -> a #

const x is a unary function which evaluates to x for all inputs.

>>> const 42 "hello"
42
>>> map (const 42) [0..3]
[42,42,42,42]

(.) :: (b -> c) -> (a -> b) -> a -> c infixr 9 #

Function composition.

data UTCTime #

This is the simplest representation of UTC. It consists of the day number, and a time offset from midnight. Note that if a day has a leap second added to it, it will have 86401 seconds.

Instances

Instances details
FromJSON UTCTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey UTCTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON UTCTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey UTCTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

Data UTCTime 
Instance details

Defined in Data.Time.Clock.Internal.UTCTime

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UTCTime -> c UTCTime #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UTCTime #

toConstr :: UTCTime -> Constr #

dataTypeOf :: UTCTime -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UTCTime) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UTCTime) #

gmapT :: (forall b. Data b => b -> b) -> UTCTime -> UTCTime #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UTCTime -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UTCTime -> r #

gmapQ :: (forall d. Data d => d -> u) -> UTCTime -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UTCTime -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UTCTime -> m UTCTime #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UTCTime -> m UTCTime #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UTCTime -> m UTCTime #

NFData UTCTime 
Instance details

Defined in Data.Time.Clock.Internal.UTCTime

Methods

rnf :: UTCTime -> () #

Eq UTCTime 
Instance details

Defined in Data.Time.Clock.Internal.UTCTime

Methods

(==) :: UTCTime -> UTCTime -> Bool #

(/=) :: UTCTime -> UTCTime -> Bool #

Ord UTCTime 
Instance details

Defined in Data.Time.Clock.Internal.UTCTime

FromHttpApiData UTCTime
>>> parseUrlPiece "2015-10-03T00:14:24Z" :: Either Text UTCTime
Right 2015-10-03 00:14:24 UTC
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData UTCTime
>>> toUrlPiece $ UTCTime (fromGregorian 2015 10 03) 864.5
"2015-10-03T00:14:24.5Z"
Instance details

Defined in Web.Internal.HttpApiData

PathPiece UTCTime Source # 
Instance details

Defined in BtcLsp.Data.Orphan

PersistField UTCTime 
Instance details

Defined in Database.Persist.Class.PersistField

PersistFieldSql UTCTime 
Instance details

Defined in Database.Persist.Sql.Class

SymbolToField "expiresAt" SwapIntoLn UTCTime Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "insertedAt" Block UTCTime Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "insertedAt" LnChan UTCTime Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "insertedAt" SwapIntoLn UTCTime Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "insertedAt" SwapUtxo UTCTime Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "insertedAt" User UTCTime Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "transactedAt" LnChan UTCTime Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "updatedAt" Block UTCTime Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "updatedAt" LnChan UTCTime Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "updatedAt" SwapIntoLn UTCTime Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "updatedAt" SwapUtxo UTCTime Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "updatedAt" User UTCTime Source # 
Instance details

Defined in BtcLsp.Storage.Model

type Rep UTCTime 
Instance details

Defined in Text.PrettyPrint.GenericPretty.Instance

type Rep UTCTime = D1 ('MetaData "UTCTime" "Data.Time.Clock.Internal.UTCTime" "time-1.9.3-4QADtHlAqaxHrrZdcJt0iS" 'False) (C1 ('MetaCons "UTCTime" 'PrefixI 'True) (S1 ('MetaSel ('Just "utctDay") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Day) :*: S1 ('MetaSel ('Just "utctDayTime") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 DiffTime)))

data HashMap k v #

A map from keys to values. A map cannot contain duplicate keys; each key can map to at most one value.

Instances

Instances details
KeyValue Object

Constructs a singleton HashMap. For calling functions that demand an Object for constructing objects. To be used in conjunction with mconcat. Prefer to use object where possible.

Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

(.=) :: ToJSON v => Text -> v -> Object #

Bifoldable HashMap

Since: unordered-containers-0.2.11

Instance details

Defined in Data.HashMap.Internal

Methods

bifold :: Monoid m => HashMap m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> HashMap a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> HashMap a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> HashMap a b -> c #

Eq2 HashMap 
Instance details

Defined in Data.HashMap.Internal

Methods

liftEq2 :: (a -> b -> Bool) -> (c -> d -> Bool) -> HashMap a c -> HashMap b d -> Bool #

Ord2 HashMap 
Instance details

Defined in Data.HashMap.Internal

Methods

liftCompare2 :: (a -> b -> Ordering) -> (c -> d -> Ordering) -> HashMap a c -> HashMap b d -> Ordering #

Show2 HashMap 
Instance details

Defined in Data.HashMap.Internal

Methods

liftShowsPrec2 :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> (Int -> b -> ShowS) -> ([b] -> ShowS) -> Int -> HashMap a b -> ShowS #

liftShowList2 :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> (Int -> b -> ShowS) -> ([b] -> ShowS) -> [HashMap a b] -> ShowS #

NFData2 HashMap

Since: unordered-containers-0.2.14.0

Instance details

Defined in Data.HashMap.Internal

Methods

liftRnf2 :: (a -> ()) -> (b -> ()) -> HashMap a b -> () #

Hashable2 HashMap 
Instance details

Defined in Data.HashMap.Internal

Methods

liftHashWithSalt2 :: (Int -> a -> Int) -> (Int -> b -> Int) -> Int -> HashMap a b -> Int #

ToObject Object 
Instance details

Defined in Katip.Core

Methods

toObject :: Object -> Object #

BiPolyMap HashMap 
Instance details

Defined in Data.Containers

Associated Types

type BPMKeyConstraint HashMap key #

Methods

mapKeysWith :: (BPMKeyConstraint HashMap k1, BPMKeyConstraint HashMap k2) => (v -> v -> v) -> (k1 -> k2) -> HashMap k1 v -> HashMap k2 v #

(Lift k, Lift v) => Lift (HashMap k v :: Type)

Since: unordered-containers-0.2.17.0

Instance details

Defined in Data.HashMap.Internal

Methods

lift :: Quote m => HashMap k v -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => HashMap k v -> Code m (HashMap k v) #

(FromJSONKey k, Eq k, Hashable k) => FromJSON1 (HashMap k) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (HashMap k a) #

liftParseJSONList :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [HashMap k a] #

ToJSONKey k => ToJSON1 (HashMap k) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Value) -> ([a] -> Value) -> HashMap k a -> Value #

liftToJSONList :: (a -> Value) -> ([a] -> Value) -> [HashMap k a] -> Value #

liftToEncoding :: (a -> Encoding) -> ([a] -> Encoding) -> HashMap k a -> Encoding #

liftToEncodingList :: (a -> Encoding) -> ([a] -> Encoding) -> [HashMap k a] -> Encoding #

Foldable (HashMap k) 
Instance details

Defined in Data.HashMap.Internal

Methods

fold :: Monoid m => HashMap k m -> m #

foldMap :: Monoid m => (a -> m) -> HashMap k a -> m #

foldMap' :: Monoid m => (a -> m) -> HashMap k a -> m #

foldr :: (a -> b -> b) -> b -> HashMap k a -> b #

foldr' :: (a -> b -> b) -> b -> HashMap k a -> b #

foldl :: (b -> a -> b) -> b -> HashMap k a -> b #

foldl' :: (b -> a -> b) -> b -> HashMap k a -> b #

foldr1 :: (a -> a -> a) -> HashMap k a -> a #

foldl1 :: (a -> a -> a) -> HashMap k a -> a #

toList :: HashMap k a -> [a] #

null :: HashMap k a -> Bool #

length :: HashMap k a -> Int #

elem :: Eq a => a -> HashMap k a -> Bool #

maximum :: Ord a => HashMap k a -> a #

minimum :: Ord a => HashMap k a -> a #

sum :: Num a => HashMap k a -> a #

product :: Num a => HashMap k a -> a #

Eq k => Eq1 (HashMap k) 
Instance details

Defined in Data.HashMap.Internal

Methods

liftEq :: (a -> b -> Bool) -> HashMap k a -> HashMap k b -> Bool #

Ord k => Ord1 (HashMap k) 
Instance details

Defined in Data.HashMap.Internal

Methods

liftCompare :: (a -> b -> Ordering) -> HashMap k a -> HashMap k b -> Ordering #

(Eq k, Hashable k, Read k) => Read1 (HashMap k) 
Instance details

Defined in Data.HashMap.Internal

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (HashMap k a) #

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [HashMap k a] #

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (HashMap k a) #

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [HashMap k a] #

Show k => Show1 (HashMap k) 
Instance details

Defined in Data.HashMap.Internal

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> HashMap k a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [HashMap k a] -> ShowS #

Traversable (HashMap k) 
Instance details

Defined in Data.HashMap.Internal

Methods

traverse :: Applicative f => (a -> f b) -> HashMap k a -> f (HashMap k b) #

sequenceA :: Applicative f => HashMap k (f a) -> f (HashMap k a) #

mapM :: Monad m => (a -> m b) -> HashMap k a -> m (HashMap k b) #

sequence :: Monad m => HashMap k (m a) -> m (HashMap k a) #

Functor (HashMap k) 
Instance details

Defined in Data.HashMap.Internal

Methods

fmap :: (a -> b) -> HashMap k a -> HashMap k b #

(<$) :: a -> HashMap k b -> HashMap k a #

NFData k => NFData1 (HashMap k)

Since: unordered-containers-0.2.14.0

Instance details

Defined in Data.HashMap.Internal

Methods

liftRnf :: (a -> ()) -> HashMap k a -> () #

Hashable k => Hashable1 (HashMap k) 
Instance details

Defined in Data.HashMap.Internal

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> HashMap k a -> Int #

FoldableWithKey (HashMap k) 
Instance details

Defined in Data.Key

Methods

toKeyedList :: HashMap k a -> [(Key (HashMap k), a)] #

foldMapWithKey :: Monoid m => (Key (HashMap k) -> a -> m) -> HashMap k a -> m #

foldrWithKey :: (Key (HashMap k) -> a -> b -> b) -> b -> HashMap k a -> b #

foldlWithKey :: (b -> Key (HashMap k) -> a -> b) -> b -> HashMap k a -> b #

(Eq k, Hashable k) => Indexable (HashMap k) 
Instance details

Defined in Data.Key

Methods

index :: HashMap k a -> Key (HashMap k) -> a #

Keyed (HashMap k) 
Instance details

Defined in Data.Key

Methods

mapWithKey :: (Key (HashMap k) -> a -> b) -> HashMap k a -> HashMap k b #

(Eq k, Hashable k) => Lookup (HashMap k) 
Instance details

Defined in Data.Key

Methods

lookup :: Key (HashMap k) -> HashMap k a -> Maybe a #

TraversableWithKey (HashMap k) 
Instance details

Defined in Data.Key

Methods

traverseWithKey :: Applicative f => (Key (HashMap k) -> a -> f b) -> HashMap k a -> f (HashMap k b) #

mapWithKeyM :: Monad m => (Key (HashMap k) -> a -> m b) -> HashMap k a -> m (HashMap k b) #

(Eq k, Hashable k) => Zip (HashMap k) 
Instance details

Defined in Data.Key

Methods

zipWith :: (a -> b -> c) -> HashMap k a -> HashMap k b -> HashMap k c #

zip :: HashMap k a -> HashMap k b -> HashMap k (a, b) #

zap :: HashMap k (a -> b) -> HashMap k a -> HashMap k b #

(Eq k, Hashable k) => ZipWithKey (HashMap k) 
Instance details

Defined in Data.Key

Methods

zipWithKey :: (Key (HashMap k) -> a -> b -> c) -> HashMap k a -> HashMap k b -> HashMap k c #

zapWithKey :: HashMap k (Key (HashMap k) -> a -> b) -> HashMap k a -> HashMap k b #

(Eq key, Hashable key) => PolyMap (HashMap key)

This instance uses the functions from Data.HashMap.Strict.

Instance details

Defined in Data.Containers

Methods

differenceMap :: HashMap key value1 -> HashMap key value2 -> HashMap key value1 #

intersectionMap :: HashMap key value1 -> HashMap key value2 -> HashMap key value1 #

intersectionWithMap :: (value1 -> value2 -> value3) -> HashMap key value1 -> HashMap key value2 -> HashMap key value3 #

(Hashable k, Eq k) => Apply (HashMap k)

A 'HashMap k' is not Applicative, but it is an instance of Apply

Instance details

Defined in Data.Functor.Bind.Class

Methods

(<.>) :: HashMap k (a -> b) -> HashMap k a -> HashMap k b #

(.>) :: HashMap k a -> HashMap k b -> HashMap k b #

(<.) :: HashMap k a -> HashMap k b -> HashMap k a #

liftF2 :: (a -> b -> c) -> HashMap k a -> HashMap k b -> HashMap k c #

(Hashable k, Eq k) => Bind (HashMap k)

A 'HashMap k' is not a Monad, but it is an instance of Bind

Instance details

Defined in Data.Functor.Bind.Class

Methods

(>>-) :: HashMap k a -> (a -> HashMap k b) -> HashMap k b #

join :: HashMap k (HashMap k a) -> HashMap k a #

(FromJSON v, FromJSONKey k, Eq k, Hashable k) => FromJSON (HashMap k v) 
Instance details

Defined in Data.Aeson.Types.FromJSON

(ToJSON v, ToJSONKey k) => ToJSON (HashMap k v) 
Instance details

Defined in Data.Aeson.Types.ToJSON

(Data k, Data v, Eq k, Hashable k) => Data (HashMap k v) 
Instance details

Defined in Data.HashMap.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> HashMap k v -> c (HashMap k v) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (HashMap k v) #

toConstr :: HashMap k v -> Constr #

dataTypeOf :: HashMap k v -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (HashMap k v)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (HashMap k v)) #

gmapT :: (forall b. Data b => b -> b) -> HashMap k v -> HashMap k v #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HashMap k v -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HashMap k v -> r #

gmapQ :: (forall d. Data d => d -> u) -> HashMap k v -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> HashMap k v -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> HashMap k v -> m (HashMap k v) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HashMap k v -> m (HashMap k v) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HashMap k v -> m (HashMap k v) #

(Eq k, Hashable k) => Monoid (HashMap k v)

mempty = empty

mappend = union

If a key occurs in both maps, the mapping from the first will be the mapping in the result.

Examples

Expand
>>> mappend (fromList [(1,'a'),(2,'b')]) (fromList [(2,'c'),(3,'d')])
fromList [(1,'a'),(2,'b'),(3,'d')]
Instance details

Defined in Data.HashMap.Internal

Methods

mempty :: HashMap k v #

mappend :: HashMap k v -> HashMap k v -> HashMap k v #

mconcat :: [HashMap k v] -> HashMap k v #

(Eq k, Hashable k) => Semigroup (HashMap k v)

<> = union

If a key occurs in both maps, the mapping from the first will be the mapping in the result.

Examples

Expand
>>> fromList [(1,'a'),(2,'b')] <> fromList [(2,'c'),(3,'d')]
fromList [(1,'a'),(2,'b'),(3,'d')]
Instance details

Defined in Data.HashMap.Internal

Methods

(<>) :: HashMap k v -> HashMap k v -> HashMap k v #

sconcat :: NonEmpty (HashMap k v) -> HashMap k v #

stimes :: Integral b => b -> HashMap k v -> HashMap k v #

(Eq k, Hashable k) => IsList (HashMap k v) 
Instance details

Defined in Data.HashMap.Internal

Associated Types

type Item (HashMap k v) #

Methods

fromList :: [Item (HashMap k v)] -> HashMap k v #

fromListN :: Int -> [Item (HashMap k v)] -> HashMap k v #

toList :: HashMap k v -> [Item (HashMap k v)] #

(Eq k, Hashable k, Read k, Read e) => Read (HashMap k e) 
Instance details

Defined in Data.HashMap.Internal

(Show k, Show v) => Show (HashMap k v) 
Instance details

Defined in Data.HashMap.Internal

Methods

showsPrec :: Int -> HashMap k v -> ShowS #

show :: HashMap k v -> String #

showList :: [HashMap k v] -> ShowS #

(NFData k, NFData v) => NFData (HashMap k v) 
Instance details

Defined in Data.HashMap.Internal

Methods

rnf :: HashMap k v -> () #

(Eq k, Eq v) => Eq (HashMap k v)

Note that, in the presence of hash collisions, equal HashMaps may behave differently, i.e. substitutivity may be violated:

>>> data D = A | B deriving (Eq, Show)
>>> instance Hashable D where hashWithSalt salt _d = salt
>>> x = fromList [(A,1), (B,2)]
>>> y = fromList [(B,2), (A,1)]
>>> x == y
True
>>> toList x
[(A,1),(B,2)]
>>> toList y
[(B,2),(A,1)]

In general, the lack of substitutivity can be observed with any function that depends on the key ordering, such as folds and traversals.

Instance details

Defined in Data.HashMap.Internal

Methods

(==) :: HashMap k v -> HashMap k v -> Bool #

(/=) :: HashMap k v -> HashMap k v -> Bool #

(Ord k, Ord v) => Ord (HashMap k v)

The ordering is total and consistent with the Eq instance. However, nothing else about the ordering is specified, and it may change from version to version of either this package or of hashable.

Instance details

Defined in Data.HashMap.Internal

Methods

compare :: HashMap k v -> HashMap k v -> Ordering #

(<) :: HashMap k v -> HashMap k v -> Bool #

(<=) :: HashMap k v -> HashMap k v -> Bool #

(>) :: HashMap k v -> HashMap k v -> Bool #

(>=) :: HashMap k v -> HashMap k v -> Bool #

max :: HashMap k v -> HashMap k v -> HashMap k v #

min :: HashMap k v -> HashMap k v -> HashMap k v #

(Hashable k, Hashable v) => Hashable (HashMap k v) 
Instance details

Defined in Data.HashMap.Internal

Methods

hashWithSalt :: Int -> HashMap k v -> Int #

hash :: HashMap k v -> Int #

(Hashable k, Eq k) => HasKeysSet (HashMap k v) 
Instance details

Defined in Data.Containers

Associated Types

type KeySet (HashMap k v) #

Methods

keysSet :: HashMap k v -> KeySet (HashMap k v) #

(Eq key, Hashable key) => IsMap (HashMap key value)

This instance uses the functions from Data.HashMap.Strict.

Instance details

Defined in Data.Containers

Associated Types

type MapValue (HashMap key value) #

Methods

lookup :: ContainerKey (HashMap key value) -> HashMap key value -> Maybe (MapValue (HashMap key value)) #

insertMap :: ContainerKey (HashMap key value) -> MapValue (HashMap key value) -> HashMap key value -> HashMap key value #

deleteMap :: ContainerKey (HashMap key value) -> HashMap key value -> HashMap key value #

singletonMap :: ContainerKey (HashMap key value) -> MapValue (HashMap key value) -> HashMap key value #

mapFromList :: [(ContainerKey (HashMap key value), MapValue (HashMap key value))] -> HashMap key value #

mapToList :: HashMap key value -> [(ContainerKey (HashMap key value), MapValue (HashMap key value))] #

findWithDefault :: MapValue (HashMap key value) -> ContainerKey (HashMap key value) -> HashMap key value -> MapValue (HashMap key value) #

insertWith :: (MapValue (HashMap key value) -> MapValue (HashMap key value) -> MapValue (HashMap key value)) -> ContainerKey (HashMap key value) -> MapValue (HashMap key value) -> HashMap key value -> HashMap key value #

insertWithKey :: (ContainerKey (HashMap key value) -> MapValue (HashMap key value) -> MapValue (HashMap key value) -> MapValue (HashMap key value)) -> ContainerKey (HashMap key value) -> MapValue (HashMap key value) -> HashMap key value -> HashMap key value #

insertLookupWithKey :: (ContainerKey (HashMap key value) -> MapValue (HashMap key value) -> MapValue (HashMap key value) -> MapValue (HashMap key value)) -> ContainerKey (HashMap key value) -> MapValue (HashMap key value) -> HashMap key value -> (Maybe (MapValue (HashMap key value)), HashMap key value) #

adjustMap :: (MapValue (HashMap key value) -> MapValue (HashMap key value)) -> ContainerKey (HashMap key value) -> HashMap key value -> HashMap key value #

adjustWithKey :: (ContainerKey (HashMap key value) -> MapValue (HashMap key value) -> MapValue (HashMap key value)) -> ContainerKey (HashMap key value) -> HashMap key value -> HashMap key value #

updateMap :: (MapValue (HashMap key value) -> Maybe (MapValue (HashMap key value))) -> ContainerKey (HashMap key value) -> HashMap key value -> HashMap key value #

updateWithKey :: (ContainerKey (HashMap key value) -> MapValue (HashMap key value) -> Maybe (MapValue (HashMap key value))) -> ContainerKey (HashMap key value) -> HashMap key value -> HashMap key value #

updateLookupWithKey :: (ContainerKey (HashMap key value) -> MapValue (HashMap key value) -> Maybe (MapValue (HashMap key value))) -> ContainerKey (HashMap key value) -> HashMap key value -> (Maybe (MapValue (HashMap key value)), HashMap key value) #

alterMap :: (Maybe (MapValue (HashMap key value)) -> Maybe (MapValue (HashMap key value))) -> ContainerKey (HashMap key value) -> HashMap key value -> HashMap key value #

unionWith :: (MapValue (HashMap key value) -> MapValue (HashMap key value) -> MapValue (HashMap key value)) -> HashMap key value -> HashMap key value -> HashMap key value #

unionWithKey :: (ContainerKey (HashMap key value) -> MapValue (HashMap key value) -> MapValue (HashMap key value) -> MapValue (HashMap key value)) -> HashMap key value -> HashMap key value -> HashMap key value #

unionsWith :: (MapValue (HashMap key value) -> MapValue (HashMap key value) -> MapValue (HashMap key value)) -> [HashMap key value] -> HashMap key value #

mapWithKey :: (ContainerKey (HashMap key value) -> MapValue (HashMap key value) -> MapValue (HashMap key value)) -> HashMap key value -> HashMap key value #

omapKeysWith :: (MapValue (HashMap key value) -> MapValue (HashMap key value) -> MapValue (HashMap key value)) -> (ContainerKey (HashMap key value) -> ContainerKey (HashMap key value)) -> HashMap key value -> HashMap key value #

filterMap :: (MapValue (HashMap key value) -> Bool) -> HashMap key value -> HashMap key value #

(Eq key, Hashable key) => SetContainer (HashMap key value)

This instance uses the functions from Data.HashMap.Strict.

Instance details

Defined in Data.Containers

Associated Types

type ContainerKey (HashMap key value) #

Methods

member :: ContainerKey (HashMap key value) -> HashMap key value -> Bool #

notMember :: ContainerKey (HashMap key value) -> HashMap key value -> Bool #

union :: HashMap key value -> HashMap key value -> HashMap key value #

unions :: (MonoFoldable mono, Element mono ~ HashMap key value) => mono -> HashMap key value #

difference :: HashMap key value -> HashMap key value -> HashMap key value #

intersection :: HashMap key value -> HashMap key value -> HashMap key value #

keys :: HashMap key value -> [ContainerKey (HashMap key value)] #

(Eq k, Hashable k) => GrowingAppend (HashMap k v) 
Instance details

Defined in Data.MonoTraversable

MonoFoldable (HashMap k v) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (HashMap k v) -> m) -> HashMap k v -> m #

ofoldr :: (Element (HashMap k v) -> b -> b) -> b -> HashMap k v -> b #

ofoldl' :: (a -> Element (HashMap k v) -> a) -> a -> HashMap k v -> a #

otoList :: HashMap k v -> [Element (HashMap k v)] #

oall :: (Element (HashMap k v) -> Bool) -> HashMap k v -> Bool #

oany :: (Element (HashMap k v) -> Bool) -> HashMap k v -> Bool #

onull :: HashMap k v -> Bool #

olength :: HashMap k v -> Int #

olength64 :: HashMap k v -> Int64 #

ocompareLength :: Integral i => HashMap k v -> i -> Ordering #

otraverse_ :: Applicative f => (Element (HashMap k v) -> f b) -> HashMap k v -> f () #

ofor_ :: Applicative f => HashMap k v -> (Element (HashMap k v) -> f b) -> f () #

omapM_ :: Applicative m => (Element (HashMap k v) -> m ()) -> HashMap k v -> m () #

oforM_ :: Applicative m => HashMap k v -> (Element (HashMap k v) -> m ()) -> m () #

ofoldlM :: Monad m => (a -> Element (HashMap k v) -> m a) -> a -> HashMap k v -> m a #

ofoldMap1Ex :: Semigroup m => (Element (HashMap k v) -> m) -> HashMap k v -> m #

ofoldr1Ex :: (Element (HashMap k v) -> Element (HashMap k v) -> Element (HashMap k v)) -> HashMap k v -> Element (HashMap k v) #

ofoldl1Ex' :: (Element (HashMap k v) -> Element (HashMap k v) -> Element (HashMap k v)) -> HashMap k v -> Element (HashMap k v) #

headEx :: HashMap k v -> Element (HashMap k v) #

lastEx :: HashMap k v -> Element (HashMap k v) #

unsafeHead :: HashMap k v -> Element (HashMap k v) #

unsafeLast :: HashMap k v -> Element (HashMap k v) #

maximumByEx :: (Element (HashMap k v) -> Element (HashMap k v) -> Ordering) -> HashMap k v -> Element (HashMap k v) #

minimumByEx :: (Element (HashMap k v) -> Element (HashMap k v) -> Ordering) -> HashMap k v -> Element (HashMap k v) #

oelem :: Element (HashMap k v) -> HashMap k v -> Bool #

onotElem :: Element (HashMap k v) -> HashMap k v -> Bool #

MonoFunctor (HashMap k v) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (HashMap k v) -> Element (HashMap k v)) -> HashMap k v -> HashMap k v #

MonoTraversable (HashMap k v) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (HashMap k v) -> f (Element (HashMap k v))) -> HashMap k v -> f (HashMap k v) #

omapM :: Applicative m => (Element (HashMap k v) -> m (Element (HashMap k v))) -> HashMap k v -> m (HashMap k v) #

Container (HashMap k v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (HashMap k v) #

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 #

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 #

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)) #

safeMaximum :: HashMap k v -> Maybe (Element (HashMap k v)) #

safeMinimum :: HashMap k v -> Maybe (Element (HashMap k v)) #

safeFoldr1 :: (Element (HashMap k v) -> Element (HashMap k v) -> Element (HashMap k v)) -> HashMap k v -> Maybe (Element (HashMap k v)) #

safeFoldl1 :: (Element (HashMap k v) -> Element (HashMap k v) -> Element (HashMap k v)) -> HashMap k v -> Maybe (Element (HashMap k v)) #

(Eq k, Hashable k) => FromList (HashMap k v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type ListElement (HashMap k v) #

type FromListC (HashMap k v) #

Methods

fromList :: [ListElement (HashMap k v)] -> HashMap k v #

Hashable k => One (HashMap k v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (HashMap k v) #

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 Val (HashMap k v) #

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 BPMKeyConstraint HashMap key 
Instance details

Defined in Data.Containers

type BPMKeyConstraint HashMap key = (Hashable key, Eq key)
type Key (HashMap k) 
Instance details

Defined in Data.Key

type Key (HashMap k) = k
type Item (HashMap k v) 
Instance details

Defined in Data.HashMap.Internal

type Item (HashMap k v) = (k, v)
type ContainerKey (HashMap key value) 
Instance details

Defined in Data.Containers

type ContainerKey (HashMap key value) = key
type KeySet (HashMap k v) 
Instance details

Defined in Data.Containers

type KeySet (HashMap k v) = HashSet k
type MapValue (HashMap key value) 
Instance details

Defined in Data.Containers

type MapValue (HashMap key value) = value
type Element (HashMap k v) 
Instance details

Defined in Data.MonoTraversable

type Element (HashMap k v) = v
type Element (HashMap k v) 
Instance details

Defined in Universum.Container.Class

type Element (HashMap k v) = ElementDefault (HashMap k v)
type FromListC (HashMap k v) 
Instance details

Defined in Universum.Container.Class

type FromListC (HashMap k v) = ()
type Key (HashMap k v) 
Instance details

Defined in Universum.Container.Class

type Key (HashMap k v) = k
type ListElement (HashMap k v) 
Instance details

Defined in Universum.Container.Class

type ListElement (HashMap k v) = Item (HashMap k v)
type OneItem (HashMap k v) 
Instance details

Defined in Universum.Container.Class

type OneItem (HashMap k v) = (k, v)
type Val (HashMap k v) 
Instance details

Defined in Universum.Container.Class

type Val (HashMap k v) = v

data Map k a #

A Map from keys k to values a.

The Semigroup operation for Map is union, which prefers values from the left operand. If m1 maps a key k to a value a1, and m2 maps the same key to a different value a2, then their union m1 <> m2 maps k to a1.

Instances

Instances details
Bifoldable Map

Since: containers-0.6.3.1

Instance details

Defined in Data.Map.Internal

Methods

bifold :: Monoid m => Map m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> Map a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> Map a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> Map a b -> c #

Eq2 Map

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

liftEq2 :: (a -> b -> Bool) -> (c -> d -> Bool) -> Map a c -> Map b d -> Bool #

Ord2 Map

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

liftCompare2 :: (a -> b -> Ordering) -> (c -> d -> Ordering) -> Map a c -> Map b d -> Ordering #

Show2 Map

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

liftShowsPrec2 :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> (Int -> b -> ShowS) -> ([b] -> ShowS) -> Int -> Map a b -> ShowS #

liftShowList2 :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> (Int -> b -> ShowS) -> ([b] -> ShowS) -> [Map a b] -> ShowS #

Hashable2 Map

Since: hashable-1.3.4.0

Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt2 :: (Int -> a -> Int) -> (Int -> b -> Int) -> Int -> Map a b -> Int #

BiPolyMap Map 
Instance details

Defined in Data.Containers

Associated Types

type BPMKeyConstraint Map key #

Methods

mapKeysWith :: (BPMKeyConstraint Map k1, BPMKeyConstraint Map k2) => (v -> v -> v) -> (k1 -> k2) -> Map k1 v -> Map k2 v #

HasField EstimateFeeRequest "addrToAmount" (Map Text Int64) 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "addrToAmount" -> (Map Text Int64 -> f (Map Text Int64)) -> EstimateFeeRequest -> f EstimateFeeRequest

HasField GetInfoResponse "features" (Map Word32 Feature) 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "features" -> (Map Word32 Feature -> f (Map Word32 Feature)) -> GetInfoResponse -> f GetInfoResponse

HasField Peer "features" (Map Word32 Feature) 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "features" -> (Map Word32 Feature -> f (Map Word32 Feature)) -> Peer -> f Peer

HasField SendManyRequest "addrToAmount" (Map Text Int64) 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "addrToAmount" -> (Map Text Int64 -> f (Map Text Int64)) -> SendManyRequest -> f SendManyRequest

HasField SendRequest "destCustomRecords" (Map Word64 ByteString) 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "destCustomRecords" -> (Map Word64 ByteString -> f (Map Word64 ByteString)) -> SendRequest -> f SendRequest

HasField Hop "customRecords" (Map Word64 ByteString) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "customRecords" -> (Map Word64 ByteString -> f (Map Word64 ByteString)) -> Hop -> f Hop

HasField LightningNode "features" (Map Word32 Feature) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "features" -> (Map Word32 Feature -> f (Map Word32 Feature)) -> LightningNode -> f LightningNode

HasField NodeMetricsResponse "betweennessCentrality" (Map Text FloatMetric) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "betweennessCentrality" -> (Map Text FloatMetric -> f (Map Text FloatMetric)) -> NodeMetricsResponse -> f NodeMetricsResponse

HasField NodeUpdate "features" (Map Word32 Feature) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "features" -> (Map Word32 Feature -> f (Map Word32 Feature)) -> NodeUpdate -> f NodeUpdate

HasField QueryRoutesRequest "destCustomRecords" (Map Word64 ByteString) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "destCustomRecords" -> (Map Word64 ByteString -> f (Map Word64 ByteString)) -> QueryRoutesRequest -> f QueryRoutesRequest

HasField WalletBalanceResponse "accountBalance" (Map Text WalletAccountBalance) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "accountBalance" -> (Map Text WalletAccountBalance -> f (Map Text WalletAccountBalance)) -> WalletBalanceResponse -> f WalletBalanceResponse

HasField Invoice "ampInvoiceState" (Map Text AMPInvoiceState) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "ampInvoiceState" -> (Map Text AMPInvoiceState -> f (Map Text AMPInvoiceState)) -> Invoice -> f Invoice

HasField Invoice "features" (Map Word32 Feature) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "features" -> (Map Word32 Feature -> f (Map Word32 Feature)) -> Invoice -> f Invoice

HasField InvoiceHTLC "customRecords" (Map Word64 ByteString) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "customRecords" -> (Map Word64 ByteString -> f (Map Word64 ByteString)) -> InvoiceHTLC -> f InvoiceHTLC

HasField ListPermissionsResponse "methodPermissions" (Map Text MacaroonPermissionList) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "methodPermissions" -> (Map Text MacaroonPermissionList -> f (Map Text MacaroonPermissionList)) -> ListPermissionsResponse -> f ListPermissionsResponse

HasField PayReq "features" (Map Word32 Feature) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "features" -> (Map Word32 Feature -> f (Map Word32 Feature)) -> PayReq -> f PayReq

HasField ForwardHtlcInterceptRequest "customRecords" (Map Word64 ByteString) 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "customRecords" -> (Map Word64 ByteString -> f (Map Word64 ByteString)) -> ForwardHtlcInterceptRequest -> f ForwardHtlcInterceptRequest

HasField SendPaymentRequest "destCustomRecords" (Map Word64 ByteString) 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "destCustomRecords" -> (Map Word64 ByteString -> f (Map Word64 ByteString)) -> SendPaymentRequest -> f SendPaymentRequest

HasField TxTemplate "outputs" (Map Text Word64) 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "outputs" -> (Map Text Word64 -> f (Map Text Word64)) -> TxTemplate -> f TxTemplate

(key ~ Text, val ~ Text) => RedirectUrl master (Route master, Map key val) 
Instance details

Defined in Yesod.Core.Handler

Methods

toTextUrl :: (MonadHandler m, HandlerSite m ~ master) => (Route master, Map key val) -> m Text #

(FromJSONKey k, Ord k) => FromJSON1 (Map k) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (Map k a) #

liftParseJSONList :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [Map k a] #

ToJSONKey k => ToJSON1 (Map k) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Value) -> ([a] -> Value) -> Map k a -> Value #

liftToJSONList :: (a -> Value) -> ([a] -> Value) -> [Map k a] -> Value #

liftToEncoding :: (a -> Encoding) -> ([a] -> Encoding) -> Map k a -> Encoding #

liftToEncodingList :: (a -> Encoding) -> ([a] -> Encoding) -> [Map k a] -> Encoding #

Foldable (Map k)

Folds in order of increasing key.

Instance details

Defined in Data.Map.Internal

Methods

fold :: Monoid m => Map k m -> m #

foldMap :: Monoid m => (a -> m) -> Map k a -> m #

foldMap' :: Monoid m => (a -> m) -> Map k a -> m #

foldr :: (a -> b -> b) -> b -> Map k a -> b #

foldr' :: (a -> b -> b) -> b -> Map k a -> b #

foldl :: (b -> a -> b) -> b -> Map k a -> b #

foldl' :: (b -> a -> b) -> b -> Map k a -> b #

foldr1 :: (a -> a -> a) -> Map k a -> a #

foldl1 :: (a -> a -> a) -> Map k a -> a #

toList :: Map k a -> [a] #

null :: Map k a -> Bool #

length :: Map k a -> Int #

elem :: Eq a => a -> Map k a -> Bool #

maximum :: Ord a => Map k a -> a #

minimum :: Ord a => Map k a -> a #

sum :: Num a => Map k a -> a #

product :: Num a => Map k a -> a #

Eq k => Eq1 (Map k)

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

liftEq :: (a -> b -> Bool) -> Map k a -> Map k b -> Bool #

Ord k => Ord1 (Map k)

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

liftCompare :: (a -> b -> Ordering) -> Map k a -> Map k b -> Ordering #

(Ord k, Read k) => Read1 (Map k)

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (Map k a) #

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [Map k a] #

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (Map k a) #

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [Map k a] #

Show k => Show1 (Map k)

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Map k a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Map k a] -> ShowS #

Traversable (Map k)

Traverses in order of increasing key.

Instance details

Defined in Data.Map.Internal

Methods

traverse :: Applicative f => (a -> f b) -> Map k a -> f (Map k b) #

sequenceA :: Applicative f => Map k (f a) -> f (Map k a) #

mapM :: Monad m => (a -> m b) -> Map k a -> m (Map k b) #

sequence :: Monad m => Map k (m a) -> m (Map k a) #

Functor (Map k) 
Instance details

Defined in Data.Map.Internal

Methods

fmap :: (a -> b) -> Map k a -> Map k b #

(<$) :: a -> Map k b -> Map k a #

Hashable k => Hashable1 (Map k)

Since: hashable-1.3.4.0

Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> Map k a -> Int #

Ord k => Adjustable (Map k) 
Instance details

Defined in Data.Key

Methods

adjust :: (a -> a) -> Key (Map k) -> Map k a -> Map k a #

replace :: Key (Map k) -> a -> Map k a -> Map k a #

FoldableWithKey (Map k) 
Instance details

Defined in Data.Key

Methods

toKeyedList :: Map k a -> [(Key (Map k), a)] #

foldMapWithKey :: Monoid m => (Key (Map k) -> a -> m) -> Map k a -> m #

foldrWithKey :: (Key (Map k) -> a -> b -> b) -> b -> Map k a -> b #

foldlWithKey :: (b -> Key (Map k) -> a -> b) -> b -> Map k a -> b #

Ord k => Indexable (Map k) 
Instance details

Defined in Data.Key

Methods

index :: Map k a -> Key (Map k) -> a #

Keyed (Map k) 
Instance details

Defined in Data.Key

Methods

mapWithKey :: (Key (Map k) -> a -> b) -> Map k a -> Map k b #

Ord k => Lookup (Map k) 
Instance details

Defined in Data.Key

Methods

lookup :: Key (Map k) -> Map k a -> Maybe a #

TraversableWithKey (Map k) 
Instance details

Defined in Data.Key

Methods

traverseWithKey :: Applicative f => (Key (Map k) -> a -> f b) -> Map k a -> f (Map k b) #

mapWithKeyM :: Monad m => (Key (Map k) -> a -> m b) -> Map k a -> m (Map k b) #

Ord k => Zip (Map k) 
Instance details

Defined in Data.Key

Methods

zipWith :: (a -> b -> c) -> Map k a -> Map k b -> Map k c #

zip :: Map k a -> Map k b -> Map k (a, b) #

zap :: Map k (a -> b) -> Map k a -> Map k b #

Ord k => ZipWithKey (Map k) 
Instance details

Defined in Data.Key

Methods

zipWithKey :: (Key (Map k) -> a -> b -> c) -> Map k a -> Map k b -> Map k c #

zapWithKey :: Map k (Key (Map k) -> a -> b) -> Map k a -> Map k b #

Ord key => PolyMap (Map key)

This instance uses the functions from Data.Map.Strict.

Instance details

Defined in Data.Containers

Methods

differenceMap :: Map key value1 -> Map key value2 -> Map key value1 #

intersectionMap :: Map key value1 -> Map key value2 -> Map key value1 #

intersectionWithMap :: (value1 -> value2 -> value3) -> Map key value1 -> Map key value2 -> Map key value3 #

Ord k => Apply (Map k)

A 'Map k' is not Applicative, but it is an instance of Apply

Instance details

Defined in Data.Functor.Bind.Class

Methods

(<.>) :: Map k (a -> b) -> Map k a -> Map k b #

(.>) :: Map k a -> Map k b -> Map k b #

(<.) :: Map k a -> Map k b -> Map k a #

liftF2 :: (a -> b -> c) -> Map k a -> Map k b -> Map k c #

Ord k => Bind (Map k)

A 'Map k' is not a Monad, but it is an instance of Bind

Instance details

Defined in Data.Functor.Bind.Class

Methods

(>>-) :: Map k a -> (a -> Map k b) -> Map k b #

join :: Map k (Map k a) -> 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 #

(Data k, Data a, Ord k) => Data (Map k a) 
Instance details

Defined in Data.Map.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Map k a -> c (Map k a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Map k a) #

toConstr :: Map k a -> Constr #

dataTypeOf :: Map k a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Map k a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Map k a)) #

gmapT :: (forall b. Data b => b -> b) -> Map k a -> Map k a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Map k a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Map k a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Map k a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Map k a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Map k a -> m (Map k a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Map k a -> m (Map k a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Map k a -> m (Map k a) #

Ord k => Monoid (Map k v) 
Instance details

Defined in Data.Map.Internal

Methods

mempty :: Map k v #

mappend :: Map k v -> Map k v -> Map k v #

mconcat :: [Map k v] -> Map k v #

Ord k => Semigroup (Map k v) 
Instance details

Defined in Data.Map.Internal

Methods

(<>) :: Map k v -> Map k v -> Map k v #

sconcat :: NonEmpty (Map k v) -> Map k v #

stimes :: Integral b => b -> Map k v -> Map k v #

Ord k => IsList (Map k v)

Since: containers-0.5.6.2

Instance details

Defined in Data.Map.Internal

Associated Types

type Item (Map k v) #

Methods

fromList :: [Item (Map k v)] -> Map k v #

fromListN :: Int -> [Item (Map k v)] -> Map k v #

toList :: Map k v -> [Item (Map k v)] #

(Ord k, Read k, Read e) => Read (Map k e) 
Instance details

Defined in Data.Map.Internal

Methods

readsPrec :: Int -> ReadS (Map k e) #

readList :: ReadS [Map k e] #

readPrec :: ReadPrec (Map k e) #

readListPrec :: ReadPrec [Map k e] #

(Show k, Show a) => Show (Map k a) 
Instance details

Defined in Data.Map.Internal

Methods

showsPrec :: Int -> Map k a -> ShowS #

show :: Map k a -> String #

showList :: [Map k a] -> ShowS #

(NFData k, NFData a) => NFData (Map k a) 
Instance details

Defined in Data.Map.Internal

Methods

rnf :: Map k a -> () #

(Eq k, Eq a) => Eq (Map k a) 
Instance details

Defined in Data.Map.Internal

Methods

(==) :: Map k a -> Map k a -> Bool #

(/=) :: Map k a -> Map k a -> Bool #

(Ord k, Ord v) => Ord (Map k v) 
Instance details

Defined in Data.Map.Internal

Methods

compare :: Map k v -> Map k v -> Ordering #

(<) :: Map k v -> Map k v -> Bool #

(<=) :: Map k v -> Map k v -> Bool #

(>) :: Map k v -> Map k v -> Bool #

(>=) :: Map k v -> Map k v -> Bool #

max :: Map k v -> Map k v -> Map k v #

min :: Map k v -> Map k v -> Map k v #

(Hashable k, Hashable v) => Hashable (Map k v)

Since: hashable-1.3.4.0

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Map k v -> Int #

hash :: Map k v -> Int #

Ord k => HasKeysSet (Map k v) 
Instance details

Defined in Data.Containers

Associated Types

type KeySet (Map k v) #

Methods

keysSet :: Map k v -> KeySet (Map k v) #

Ord key => IsMap (Map key value)

This instance uses the functions from Data.Map.Strict.

Instance details

Defined in Data.Containers

Associated Types

type MapValue (Map key value) #

Methods

lookup :: ContainerKey (Map key value) -> Map key value -> Maybe (MapValue (Map key value)) #

insertMap :: ContainerKey (Map key value) -> MapValue (Map key value) -> Map key value -> Map key value #

deleteMap :: ContainerKey (Map key value) -> Map key value -> Map key value #

singletonMap :: ContainerKey (Map key value) -> MapValue (Map key value) -> Map key value #

mapFromList :: [(ContainerKey (Map key value), MapValue (Map key value))] -> Map key value #

mapToList :: Map key value -> [(ContainerKey (Map key value), MapValue (Map key value))] #

findWithDefault :: MapValue (Map key value) -> ContainerKey (Map key value) -> Map key value -> MapValue (Map key value) #

insertWith :: (MapValue (Map key value) -> MapValue (Map key value) -> MapValue (Map key value)) -> ContainerKey (Map key value) -> MapValue (Map key value) -> Map key value -> Map key value #

insertWithKey :: (ContainerKey (Map key value) -> MapValue (Map key value) -> MapValue (Map key value) -> MapValue (Map key value)) -> ContainerKey (Map key value) -> MapValue (Map key value) -> Map key value -> Map key value #

insertLookupWithKey :: (ContainerKey (Map key value) -> MapValue (Map key value) -> MapValue (Map key value) -> MapValue (Map key value)) -> ContainerKey (Map key value) -> MapValue (Map key value) -> Map key value -> (Maybe (MapValue (Map key value)), Map key value) #

adjustMap :: (MapValue (Map key value) -> MapValue (Map key value)) -> ContainerKey (Map key value) -> Map key value -> Map key value #

adjustWithKey :: (ContainerKey (Map key value) -> MapValue (Map key value) -> MapValue (Map key value)) -> ContainerKey (Map key value) -> Map key value -> Map key value #

updateMap :: (MapValue (Map key value) -> Maybe (MapValue (Map key value))) -> ContainerKey (Map key value) -> Map key value -> Map key value #

updateWithKey :: (ContainerKey (Map key value) -> MapValue (Map key value) -> Maybe (MapValue (Map key value))) -> ContainerKey (Map key value) -> Map key value -> Map key value #

updateLookupWithKey :: (ContainerKey (Map key value) -> MapValue (Map key value) -> Maybe (MapValue (Map key value))) -> ContainerKey (Map key value) -> Map key value -> (Maybe (MapValue (Map key value)), Map key value) #

alterMap :: (Maybe (MapValue (Map key value)) -> Maybe (MapValue (Map key value))) -> ContainerKey (Map key value) -> Map key value -> Map key value #

unionWith :: (MapValue (Map key value) -> MapValue (Map key value) -> MapValue (Map key value)) -> Map key value -> Map key value -> Map key value #

unionWithKey :: (ContainerKey (Map key value) -> MapValue (Map key value) -> MapValue (Map key value) -> MapValue (Map key value)) -> Map key value -> Map key value -> Map key value #

unionsWith :: (MapValue (Map key value) -> MapValue (Map key value) -> MapValue (Map key value)) -> [Map key value] -> Map key value #

mapWithKey :: (ContainerKey (Map key value) -> MapValue (Map key value) -> MapValue (Map key value)) -> Map key value -> Map key value #

omapKeysWith :: (MapValue (Map key value) -> MapValue (Map key value) -> MapValue (Map key value)) -> (ContainerKey (Map key value) -> ContainerKey (Map key value)) -> Map key value -> Map key value #

filterMap :: (MapValue (Map key value) -> Bool) -> Map key value -> Map key value #

Ord k => SetContainer (Map k v)

This instance uses the functions from Data.Map.Strict.

Instance details

Defined in Data.Containers

Associated Types

type ContainerKey (Map k v) #

Methods

member :: ContainerKey (Map k v) -> Map k v -> Bool #

notMember :: ContainerKey (Map k v) -> Map k v -> Bool #

union :: Map k v -> Map k v -> Map k v #

unions :: (MonoFoldable mono, Element mono ~ Map k v) => mono -> Map k v #

difference :: Map k v -> Map k v -> Map k v #

intersection :: Map k v -> Map k v -> Map k v #

keys :: Map k v -> [ContainerKey (Map k v)] #

Ord k => GrowingAppend (Map k v) 
Instance details

Defined in Data.MonoTraversable

MonoFoldable (Map k v) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (Map k v) -> m) -> Map k v -> m #

ofoldr :: (Element (Map k v) -> b -> b) -> b -> Map k v -> b #

ofoldl' :: (a -> Element (Map k v) -> a) -> a -> Map k v -> a #

otoList :: Map k v -> [Element (Map k v)] #

oall :: (Element (Map k v) -> Bool) -> Map k v -> Bool #

oany :: (Element (Map k v) -> Bool) -> Map k v -> Bool #

onull :: Map k v -> Bool #

olength :: Map k v -> Int #

olength64 :: Map k v -> Int64 #

ocompareLength :: Integral i => Map k v -> i -> Ordering #

otraverse_ :: Applicative f => (Element (Map k v) -> f b) -> Map k v -> f () #

ofor_ :: Applicative f => Map k v -> (Element (Map k v) -> f b) -> f () #

omapM_ :: Applicative m => (Element (Map k v) -> m ()) -> Map k v -> m () #

oforM_ :: Applicative m => Map k v -> (Element (Map k v) -> m ()) -> m () #

ofoldlM :: Monad m => (a -> Element (Map k v) -> m a) -> a -> Map k v -> m a #

ofoldMap1Ex :: Semigroup m => (Element (Map k v) -> m) -> Map k v -> m #

ofoldr1Ex :: (Element (Map k v) -> Element (Map k v) -> Element (Map k v)) -> Map k v -> Element (Map k v) #

ofoldl1Ex' :: (Element (Map k v) -> Element (Map k v) -> Element (Map k v)) -> Map k v -> Element (Map k v) #

headEx :: Map k v -> Element (Map k v) #

lastEx :: Map k v -> Element (Map k v) #

unsafeHead :: Map k v -> Element (Map k v) #

unsafeLast :: Map k v -> Element (Map k v) #

maximumByEx :: (Element (Map k v) -> Element (Map k v) -> Ordering) -> Map k v -> Element (Map k v) #

minimumByEx :: (Element (Map k v) -> Element (Map k v) -> Ordering) -> Map k v -> Element (Map k v) #

oelem :: Element (Map k v) -> Map k v -> Bool #

onotElem :: Element (Map k v) -> Map k v -> Bool #

MonoFunctor (Map k v) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Map k v) -> Element (Map k v)) -> Map k v -> Map k v #

MonoTraversable (Map k v) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (Map k v) -> f (Element (Map k v))) -> Map k v -> f (Map k v) #

omapM :: Applicative m => (Element (Map k v) -> m (Element (Map k v))) -> Map k v -> m (Map k v) #

PersistField v => PersistField (Map Text v) 
Instance details

Defined in Database.Persist.Class.PersistField

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) #

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 #

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 #

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)) #

safeMaximum :: Map k v -> Maybe (Element (Map k v)) #

safeMinimum :: Map k v -> Maybe (Element (Map k v)) #

safeFoldr1 :: (Element (Map k v) -> Element (Map k v) -> Element (Map k v)) -> Map k v -> Maybe (Element (Map k v)) #

safeFoldl1 :: (Element (Map k v) -> Element (Map k v) -> Element (Map k v)) -> Map k v -> Maybe (Element (Map k v)) #

Ord k => FromList (Map k v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type ListElement (Map k v) #

type FromListC (Map k v) #

Methods

fromList :: [ListElement (Map k v)] -> Map k v #

One (Map k v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (Map k v) #

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 Val (Map k v) #

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 BPMKeyConstraint Map key 
Instance details

Defined in Data.Containers

type BPMKeyConstraint Map key = Ord key
type Key (Map k) 
Instance details

Defined in Data.Key

type Key (Map k) = k
type Item (Map k v) 
Instance details

Defined in Data.Map.Internal

type Item (Map k v) = (k, v)
type ContainerKey (Map k v) 
Instance details

Defined in Data.Containers

type ContainerKey (Map k v) = k
type KeySet (Map k v) 
Instance details

Defined in Data.Containers

type KeySet (Map k v) = Set k
type MapValue (Map key value) 
Instance details

Defined in Data.Containers

type MapValue (Map key value) = value
type Element (Map k v) 
Instance details

Defined in Data.MonoTraversable

type Element (Map k v) = v
type Element (Map k v) 
Instance details

Defined in Universum.Container.Class

type Element (Map k v) = ElementDefault (Map k v)
type FromListC (Map k v) 
Instance details

Defined in Universum.Container.Class

type FromListC (Map k v) = ()
type Key (Map k v) 
Instance details

Defined in Universum.Container.Class

type Key (Map k v) = k
type ListElement (Map k v) 
Instance details

Defined in Universum.Container.Class

type ListElement (Map k v) = Item (Map k v)
type OneItem (Map k v) 
Instance details

Defined in Universum.Container.Class

type OneItem (Map k v) = (k, v)
type Val (Map k v) 
Instance details

Defined in Universum.Container.Class

type Val (Map k v) = v

class ToJSON a #

A type that can be converted to JSON.

Instances in general must specify toJSON and should (but don't need to) specify toEncoding.

An example type and instance:

-- Allow ourselves to write Text literals.
{-# LANGUAGE OverloadedStrings #-}

data Coord = Coord { x :: Double, y :: Double }

instance ToJSON Coord where
  toJSON (Coord x y) = object ["x" .= x, "y" .= y]

  toEncoding (Coord x y) = pairs ("x" .= x <> "y" .= y)

Instead of manually writing your ToJSON instance, there are two options to do it automatically:

  • Data.Aeson.TH provides Template Haskell functions which will derive an instance at compile time. The generated instance is optimized for your type so it will probably be more efficient than the following option.
  • The compiler can provide a default generic implementation for toJSON.

To use the second, simply add a deriving Generic clause to your datatype and declare a ToJSON instance. If you require nothing other than defaultOptions, it is sufficient to write (and this is the only alternative where the default toJSON implementation is sufficient):

{-# LANGUAGE DeriveGeneric #-}

import GHC.Generics

data Coord = Coord { x :: Double, y :: Double } deriving Generic

instance ToJSON Coord where
    toEncoding = genericToEncoding defaultOptions

If on the other hand you wish to customize the generic decoding, you have to implement both methods:

customOptions = defaultOptions
                { fieldLabelModifier = map toUpper
                }

instance ToJSON Coord where
    toJSON     = genericToJSON customOptions
    toEncoding = genericToEncoding customOptions

Previous versions of this library only had the toJSON method. Adding toEncoding had two reasons:

  1. toEncoding is more efficient for the common case that the output of toJSON is directly serialized to a ByteString. Further, expressing either method in terms of the other would be non-optimal.
  2. The choice of defaults allows a smooth transition for existing users: Existing instances that do not define toEncoding still compile and have the correct semantics. This is ensured by making the default implementation of toEncoding use toJSON. This produces correct results, but since it performs an intermediate conversion to a Value, it will be less efficient than directly emitting an Encoding. (this also means that specifying nothing more than instance ToJSON Coord would be sufficient as a generically decoding instance, but there probably exists no good reason to not specify toEncoding in new instances.)

Instances

Instances details
ToJSON DotNetTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Value 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Number 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Version 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Void 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON CTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Int16 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Int32 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Int64 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Int8 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Word16 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Word32 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Word64 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON BlkHeight Source # 
Instance details

Defined in BtcLsp.Data.Type

ToJSON SwapHash Source # 
Instance details

Defined in BtcLsp.Data.Type

ToJSON Datetime 
Instance details

Defined in Chronos

ToJSON Day 
Instance details

Defined in Chronos

ToJSON Offset 
Instance details

Defined in Chronos

ToJSON Time 
Instance details

Defined in Chronos

ToJSON Timespan 
Instance details

Defined in Chronos

ToJSON IntSet 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Ordering 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Environment 
Instance details

Defined in Katip.Core

ToJSON LocJs 
Instance details

Defined in Katip.Core

ToJSON Namespace 
Instance details

Defined in Katip.Core

ToJSON ProcessIDJs 
Instance details

Defined in Katip.Core

ToJSON Severity 
Instance details

Defined in Katip.Core

ToJSON SimpleLogPayload

A built-in convenience log payload that won't log anything on V0, but will log everything in any other level of verbosity. Intended for easy in-line usage without having to define new log types.

Construct using sl and combine multiple tuples using <> from Monoid.

Instance details

Defined in Katip.Core

ToJSON ThreadIdText 
Instance details

Defined in Katip.Core

ToJSON Verbosity 
Instance details

Defined in Katip.Core

ToJSON LogContexts 
Instance details

Defined in Katip.Monadic

ToJSON RpcName 
Instance details

Defined in LndClient.RPC.Generic

Methods

toJSON :: RpcName -> Value #

toEncoding :: RpcName -> Encoding #

toJSONList :: [RpcName] -> Value #

toEncodingList :: [RpcName] -> Encoding #

ToJSON AddrAddress 
Instance details

Defined in Network.Bitcoin.Internal

Methods

toJSON :: AddrAddress -> Value #

toEncoding :: AddrAddress -> Encoding #

toJSONList :: [AddrAddress] -> Value #

toEncodingList :: [AddrAddress] -> Encoding #

ToJSON UnspentForSigning 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

toJSON :: UnspentForSigning -> Value #

toEncoding :: UnspentForSigning -> Encoding #

toJSONList :: [UnspentForSigning] -> Value #

toEncodingList :: [UnspentForSigning] -> Encoding #

ToJSON UnspentTransaction 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

toJSON :: UnspentTransaction -> Value #

toEncoding :: UnspentTransaction -> Encoding #

toJSONList :: [UnspentTransaction] -> Value #

toEncodingList :: [UnspentTransaction] -> Encoding #

ToJSON TransactionID 
Instance details

Defined in Network.Bitcoin.Types

Methods

toJSON :: TransactionID -> Value #

toEncoding :: TransactionID -> Encoding #

toJSONList :: [TransactionID] -> Value #

toEncodingList :: [TransactionID] -> Encoding #

ToJSON EstimationMode 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

toJSON :: EstimationMode -> Value #

toEncoding :: EstimationMode -> Encoding #

toJSONList :: [EstimationMode] -> Value #

toEncodingList :: [EstimationMode] -> Encoding #

ToJSON PersistValue 
Instance details

Defined in Database.Persist.PersistValue

ToJSON Scientific 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Text 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Text 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON CalendarDiffDays 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Day 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON DayOfWeek 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON DiffTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON NominalDiffTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON SystemTime

Encoded as number

Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON UTCTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON CalendarDiffTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON LocalTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON TimeOfDay 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON ZonedTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Month 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Quarter 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON QuarterOfYear 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON UUID 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Textarea 
Instance details

Defined in Yesod.Form.Fields

ToJSON Word8 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Integer 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Natural 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON () 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: () -> Value #

toEncoding :: () -> Encoding #

toJSONList :: [()] -> Value #

toEncodingList :: [()] -> Encoding #

ToJSON Bool 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Char 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Double 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Float 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Int 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Word 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a => ToJSON (Identity a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a => ToJSON (First a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a => ToJSON (Last a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a => ToJSON (First a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a => ToJSON (Last a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a => ToJSON (Max a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Max a -> Value #

toEncoding :: Max a -> Encoding #

toJSONList :: [Max a] -> Value #

toEncodingList :: [Max a] -> Encoding #

ToJSON a => ToJSON (Min a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Min a -> Value #

toEncoding :: Min a -> Encoding #

toJSONList :: [Min a] -> Value #

toEncodingList :: [Min a] -> Encoding #

ToJSON a => ToJSON (Option a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a => ToJSON (WrappedMonoid a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a => ToJSON (Dual a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a => ToJSON (NonEmpty a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

(ToJSON a, Integral a) => ToJSON (Ratio a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a => ToJSON (IntMap a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a => ToJSON (Seq a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Seq a -> Value #

toEncoding :: Seq a -> Encoding #

toJSONList :: [Seq a] -> Value #

toEncodingList :: [Seq a] -> Encoding #

ToJSON a => ToJSON (Set a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Set a -> Value #

toEncoding :: Set a -> Encoding #

toJSONList :: [Set a] -> Value #

toEncodingList :: [Set a] -> Encoding #

ToJSON v => ToJSON (Tree v) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON1 f => ToJSON (Fix f)

Since: aeson-1.5.3.0

Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Fix f -> Value #

toEncoding :: Fix f -> Encoding #

toJSONList :: [Fix f] -> Value #

toEncodingList :: [Fix f] -> Encoding #

(ToJSON1 f, Functor f) => ToJSON (Mu f)

Since: aeson-1.5.3.0

Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Mu f -> Value #

toEncoding :: Mu f -> Encoding #

toJSONList :: [Mu f] -> Value #

toEncodingList :: [Mu f] -> Encoding #

(ToJSON1 f, Functor f) => ToJSON (Nu f)

Since: aeson-1.5.3.0

Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Nu f -> Value #

toEncoding :: Nu f -> Encoding #

toJSONList :: [Nu f] -> Value #

toEncodingList :: [Nu f] -> Encoding #

ToJSON a => ToJSON (DNonEmpty a)

Since: aeson-1.5.3.0

Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a => ToJSON (DList a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a => ToJSON (Item a) 
Instance details

Defined in Katip.Core

ToJSON (Key Block) Source # 
Instance details

Defined in BtcLsp.Storage.Model

ToJSON (Key LnChan) Source # 
Instance details

Defined in BtcLsp.Storage.Model

ToJSON (Key SwapIntoLn) Source # 
Instance details

Defined in BtcLsp.Storage.Model

ToJSON (Key SwapUtxo) Source # 
Instance details

Defined in BtcLsp.Storage.Model

ToJSON (Key User) Source # 
Instance details

Defined in BtcLsp.Storage.Model

(BackendCompatible b s, ToJSON (BackendKey b)) => ToJSON (BackendKey (Compatible b s)) 
Instance details

Defined in Database.Persist.Compatible.Types

(PersistCore b, PersistCore (RawPostgresql b), ToJSON (BackendKey b)) => ToJSON (BackendKey (RawPostgresql b)) 
Instance details

Defined in Database.Persist.Postgresql

ToJSON a => ToJSON (Array a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

(Prim a, ToJSON a) => ToJSON (PrimArray a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a => ToJSON (SmallArray a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a => ToJSON (Maybe a)

Since: aeson-1.5.3.0

Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a => ToJSON (HashSet a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a => ToJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

(Prim a, ToJSON a) => ToJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

(Storable a, ToJSON a) => ToJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

(Vector Vector a, ToJSON a) => ToJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a => ToJSON (Maybe a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a => ToJSON [a] 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: [a] -> Value #

toEncoding :: [a] -> Encoding #

toJSONList :: [[a]] -> Value #

toEncodingList :: [[a]] -> Encoding #

(ToJSON a, ToJSON b) => ToJSON (Either a b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Either a b -> Value #

toEncoding :: Either a b -> Encoding #

toJSONList :: [Either a b] -> Value #

toEncodingList :: [Either a b] -> Encoding #

HasResolution a => ToJSON (Fixed a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON (Proxy a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

(ToJSON v, ToJSONKey k) => ToJSON (Map k v) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Map k v -> Value #

toEncoding :: Map k v -> Encoding #

toJSONList :: [Map k v] -> Value #

toEncodingList :: [Map k v] -> Encoding #

(ToJSON a, ToJSON b) => ToJSON (Either a b)

Since: aeson-1.5.3.0

Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Either a b -> Value #

toEncoding :: Either a b -> Encoding #

toJSONList :: [Either a b] -> Value #

toEncodingList :: [Either a b] -> Encoding #

(ToJSON a, ToJSON b) => ToJSON (These a b)

Since: aeson-1.5.3.0

Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: These a b -> Value #

toEncoding :: These a b -> Encoding #

toJSONList :: [These a b] -> Value #

toEncodingList :: [These a b] -> Encoding #

(ToJSON a, ToJSON b) => ToJSON (Pair a b)

Since: aeson-1.5.3.0

Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Pair a b -> Value #

toEncoding :: Pair a b -> Encoding #

toJSONList :: [Pair a b] -> Value #

toEncodingList :: [Pair a b] -> Encoding #

(ToJSON a, ToJSON b) => ToJSON (These a b)

Since: aeson-1.5.1.0

Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: These a b -> Value #

toEncoding :: These a b -> Encoding #

toJSONList :: [These a b] -> Value #

toEncodingList :: [These a b] -> Encoding #

(ToJSON v, ToJSONKey k) => ToJSON (HashMap k v) 
Instance details

Defined in Data.Aeson.Types.ToJSON

(ToJSON a, ToJSON b) => ToJSON (a, b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: (a, b) -> Value #

toEncoding :: (a, b) -> Encoding #

toJSONList :: [(a, b)] -> Value #

toEncodingList :: [(a, b)] -> Encoding #

ToJSON a => ToJSON (Const a b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Const a b -> Value #

toEncoding :: Const a b -> Encoding #

toJSONList :: [Const a b] -> Value #

toEncodingList :: [Const a b] -> Encoding #

ToJSON b => ToJSON (Tagged a b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Tagged a b -> Value #

toEncoding :: Tagged a b -> Encoding #

toJSONList :: [Tagged a b] -> Value #

toEncodingList :: [Tagged a b] -> Encoding #

(ToJSON1 f, ToJSON1 g, ToJSON a) => ToJSON (These1 f g a)

Since: aeson-1.5.1.0

Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: These1 f g a -> Value #

toEncoding :: These1 f g a -> Encoding #

toJSONList :: [These1 f g a] -> Value #

toEncodingList :: [These1 f g a] -> Encoding #

(ToJSON a, ToJSON b, ToJSON c) => ToJSON (a, b, c) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: (a, b, c) -> Value #

toEncoding :: (a, b, c) -> Encoding #

toJSONList :: [(a, b, c)] -> Value #

toEncodingList :: [(a, b, c)] -> Encoding #

(ToJSON1 f, ToJSON1 g, ToJSON a) => ToJSON (Product f g a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Product f g a -> Value #

toEncoding :: Product f g a -> Encoding #

toJSONList :: [Product f g a] -> Value #

toEncodingList :: [Product f g a] -> Encoding #

(ToJSON1 f, ToJSON1 g, ToJSON a) => ToJSON (Sum f g a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Sum f g a -> Value #

toEncoding :: Sum f g a -> Encoding #

toJSONList :: [Sum f g a] -> Value #

toEncodingList :: [Sum f g a] -> Encoding #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d) => ToJSON (a, b, c, d) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: (a, b, c, d) -> Value #

toEncoding :: (a, b, c, d) -> Encoding #

toJSONList :: [(a, b, c, d)] -> Value #

toEncodingList :: [(a, b, c, d)] -> Encoding #

(ToJSON1 f, ToJSON1 g, ToJSON a) => ToJSON (Compose f g a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Compose f g a -> Value #

toEncoding :: Compose f g a -> Encoding #

toJSONList :: [Compose f g a] -> Value #

toEncodingList :: [Compose f g a] -> Encoding #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e) => ToJSON (a, b, c, d, e) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: (a, b, c, d, e) -> Value #

toEncoding :: (a, b, c, d, e) -> Encoding #

toJSONList :: [(a, b, c, d, e)] -> Value #

toEncodingList :: [(a, b, c, d, e)] -> Encoding #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f) => ToJSON (a, b, c, d, e, f) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: (a, b, c, d, e, f) -> Value #

toEncoding :: (a, b, c, d, e, f) -> Encoding #

toJSONList :: [(a, b, c, d, e, f)] -> Value #

toEncodingList :: [(a, b, c, d, e, f)] -> Encoding #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g) => ToJSON (a, b, c, d, e, f, g) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: (a, b, c, d, e, f, g) -> Value #

toEncoding :: (a, b, c, d, e, f, g) -> Encoding #

toJSONList :: [(a, b, c, d, e, f, g)] -> Value #

toEncodingList :: [(a, b, c, d, e, f, g)] -> Encoding #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h) => ToJSON (a, b, c, d, e, f, g, h) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: (a, b, c, d, e, f, g, h) -> Value #

toEncoding :: (a, b, c, d, e, f, g, h) -> Encoding #

toJSONList :: [(a, b, c, d, e, f, g, h)] -> Value #

toEncodingList :: [(a, b, c, d, e, f, g, h)] -> Encoding #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h, ToJSON i) => ToJSON (a, b, c, d, e, f, g, h, i) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: (a, b, c, d, e, f, g, h, i) -> Value #

toEncoding :: (a, b, c, d, e, f, g, h, i) -> Encoding #

toJSONList :: [(a, b, c, d, e, f, g, h, i)] -> Value #

toEncodingList :: [(a, b, c, d, e, f, g, h, i)] -> Encoding #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h, ToJSON i, ToJSON j) => ToJSON (a, b, c, d, e, f, g, h, i, j) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: (a, b, c, d, e, f, g, h, i, j) -> Value #

toEncoding :: (a, b, c, d, e, f, g, h, i, j) -> Encoding #

toJSONList :: [(a, b, c, d, e, f, g, h, i, j)] -> Value #

toEncodingList :: [(a, b, c, d, e, f, g, h, i, j)] -> Encoding #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h, ToJSON i, ToJSON j, ToJSON k) => ToJSON (a, b, c, d, e, f, g, h, i, j, k) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: (a, b, c, d, e, f, g, h, i, j, k) -> Value #

toEncoding :: (a, b, c, d, e, f, g, h, i, j, k) -> Encoding #

toJSONList :: [(a, b, c, d, e, f, g, h, i, j, k)] -> Value #

toEncodingList :: [(a, b, c, d, e, f, g, h, i, j, k)] -> Encoding #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h, ToJSON i, ToJSON j, ToJSON k, ToJSON l) => ToJSON (a, b, c, d, e, f, g, h, i, j, k, l) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: (a, b, c, d, e, f, g, h, i, j, k, l) -> Value #

toEncoding :: (a, b, c, d, e, f, g, h, i, j, k, l) -> Encoding #

toJSONList :: [(a, b, c, d, e, f, g, h, i, j, k, l)] -> Value #

toEncodingList :: [(a, b, c, d, e, f, g, h, i, j, k, l)] -> Encoding #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h, ToJSON i, ToJSON j, ToJSON k, ToJSON l, ToJSON m) => ToJSON (a, b, c, d, e, f, g, h, i, j, k, l, m) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Value #

toEncoding :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Encoding #

toJSONList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m)] -> Value #

toEncodingList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m)] -> Encoding #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h, ToJSON i, ToJSON j, ToJSON k, ToJSON l, ToJSON m, ToJSON n) => ToJSON (a, b, c, d, e, f, g, h, i, j, k, l, m, n) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Value #

toEncoding :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Encoding #

toJSONList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m, n)] -> Value #

toEncodingList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m, n)] -> Encoding #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h, ToJSON i, ToJSON j, ToJSON k, ToJSON l, ToJSON m, ToJSON n, ToJSON o) => ToJSON (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Value #

toEncoding :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Encoding #

toJSONList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)] -> Value #

toEncodingList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)] -> Encoding #

fromJSON :: FromJSON a => Value -> Result a #

Convert a value from JSON, failing if the types do not match.

genericParseJSON :: (Generic a, GFromJSON Zero (Rep a)) => Options -> Value -> Parser a #

A configurable generic JSON decoder. This function applied to defaultOptions is used as the default for parseJSON when the type is an instance of Generic.

class FromJSON a where #

A type that can be converted from JSON, with the possibility of failure.

In many cases, you can get the compiler to generate parsing code for you (see below). To begin, let's cover writing an instance by hand.

There are various reasons a conversion could fail. For example, an Object could be missing a required key, an Array could be of the wrong size, or a value could be of an incompatible type.

The basic ways to signal a failed conversion are as follows:

  • fail yields a custom error message: it is the recommended way of reporting a failure;
  • empty (or mzero) is uninformative: use it when the error is meant to be caught by some (<|>);
  • typeMismatch can be used to report a failure when the encountered value is not of the expected JSON type; unexpected is an appropriate alternative when more than one type may be expected, or to keep the expected type implicit.

prependFailure (or modifyFailure) add more information to a parser's error messages.

An example type and instance using typeMismatch and prependFailure:

-- Allow ourselves to write Text literals.
{-# LANGUAGE OverloadedStrings #-}

data Coord = Coord { x :: Double, y :: Double }

instance FromJSON Coord where
    parseJSON (Object v) = Coord
        <$> v .: "x"
        <*> v .: "y"

    -- We do not expect a non-Object value here.
    -- We could use empty to fail, but typeMismatch
    -- gives a much more informative error message.
    parseJSON invalid    =
        prependFailure "parsing Coord failed, "
            (typeMismatch "Object" invalid)

For this common case of only being concerned with a single type of JSON value, the functions withObject, withScientific, etc. are provided. Their use is to be preferred when possible, since they are more terse. Using withObject, we can rewrite the above instance (assuming the same language extension and data type) as:

instance FromJSON Coord where
    parseJSON = withObject "Coord" $ \v -> Coord
        <$> v .: "x"
        <*> v .: "y"

Instead of manually writing your FromJSON instance, there are two options to do it automatically:

  • Data.Aeson.TH provides Template Haskell functions which will derive an instance at compile time. The generated instance is optimized for your type so it will probably be more efficient than the following option.
  • The compiler can provide a default generic implementation for parseJSON.

To use the second, simply add a deriving Generic clause to your datatype and declare a FromJSON instance for your datatype without giving a definition for parseJSON.

For example, the previous example can be simplified to just:

{-# LANGUAGE DeriveGeneric #-}

import GHC.Generics

data Coord = Coord { x :: Double, y :: Double } deriving Generic

instance FromJSON Coord

The default implementation will be equivalent to parseJSON = genericParseJSON defaultOptions; if you need different options, you can customize the generic decoding by defining:

customOptions = defaultOptions
                { fieldLabelModifier = map toUpper
                }

instance FromJSON Coord where
    parseJSON = genericParseJSON customOptions

Minimal complete definition

Nothing

Methods

parseJSON :: Value -> Parser a #

parseJSONList :: Value -> Parser [a] #

Instances

Instances details
FromJSON DotNetTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Value 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Version 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Void 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON CTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Int16 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Int32 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Int64 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Int8 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Word16 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Word32 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Word64 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON BitcoindEnv Source # 
Instance details

Defined in BtcLsp.Data.Env

FromJSON YesodLog Source # 
Instance details

Defined in BtcLsp.Data.Type

FromJSON GCEnv Source # 
Instance details

Defined in BtcLsp.Grpc.Client.LowLevel

FromJSON GCPort Source # 
Instance details

Defined in BtcLsp.Grpc.Client.LowLevel

FromJSON Encryption Source # 
Instance details

Defined in BtcLsp.Grpc.Data

FromJSON SigHeaderName Source # 
Instance details

Defined in BtcLsp.Grpc.Data

FromJSON GSEnv Source # 
Instance details

Defined in BtcLsp.Grpc.Server.LowLevel

FromJSON AppSettings Source # 
Instance details

Defined in BtcLsp.Yesod.Settings

FromJSON Datetime 
Instance details

Defined in Chronos

FromJSON Day 
Instance details

Defined in Chronos

FromJSON Offset 
Instance details

Defined in Chronos

FromJSON Time 
Instance details

Defined in Chronos

FromJSON Timespan 
Instance details

Defined in Chronos

FromJSON IntSet 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Ordering 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON CompressMode Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

FromJSON Environment 
Instance details

Defined in Katip.Core

FromJSON LocJs 
Instance details

Defined in Katip.Core

FromJSON LogStr 
Instance details

Defined in Katip.Core

FromJSON Namespace 
Instance details

Defined in Katip.Core

FromJSON ProcessIDJs 
Instance details

Defined in Katip.Core

FromJSON Severity 
Instance details

Defined in Katip.Core

FromJSON ThreadIdText 
Instance details

Defined in Katip.Core

FromJSON Verbosity 
Instance details

Defined in Katip.Core

FromJSON LndEnv 
Instance details

Defined in LndClient.Data.LndEnv

Methods

parseJSON :: Value -> Parser LndEnv #

parseJSONList :: Value -> Parser [LndEnv] #

FromJSON LndHexMacaroon 
Instance details

Defined in LndClient.Data.LndEnv

Methods

parseJSON :: Value -> Parser LndHexMacaroon #

parseJSONList :: Value -> Parser [LndHexMacaroon] #

FromJSON LndHost' 
Instance details

Defined in LndClient.Data.LndEnv

Methods

parseJSON :: Value -> Parser LndHost' #

parseJSONList :: Value -> Parser [LndHost'] #

FromJSON LndPort' 
Instance details

Defined in LndClient.Data.LndEnv

Methods

parseJSON :: Value -> Parser LndPort' #

parseJSONList :: Value -> Parser [LndPort'] #

FromJSON LndTlsCert 
Instance details

Defined in LndClient.Data.LndEnv

Methods

parseJSON :: Value -> Parser LndTlsCert #

parseJSONList :: Value -> Parser [LndTlsCert] #

FromJSON LndWalletPassword 
Instance details

Defined in LndClient.Data.LndEnv

Methods

parseJSON :: Value -> Parser LndWalletPassword #

parseJSONList :: Value -> Parser [LndWalletPassword] #

FromJSON RawConfig 
Instance details

Defined in LndClient.Data.LndEnv

Methods

parseJSON :: Value -> Parser RawConfig #

parseJSONList :: Value -> Parser [RawConfig] #

FromJSON AezeedPassphrase 
Instance details

Defined in LndClient.Data.Newtype

Methods

parseJSON :: Value -> Parser AezeedPassphrase #

parseJSONList :: Value -> Parser [AezeedPassphrase] #

FromJSON CipherSeedMnemonic 
Instance details

Defined in LndClient.Data.Newtype

Methods

parseJSON :: Value -> Parser CipherSeedMnemonic #

parseJSONList :: Value -> Parser [CipherSeedMnemonic] #

FromJSON GrpcTimeoutSeconds 
Instance details

Defined in LndClient.Data.Newtype

Methods

parseJSON :: Value -> Parser GrpcTimeoutSeconds #

parseJSONList :: Value -> Parser [GrpcTimeoutSeconds] #

FromJSON MSat 
Instance details

Defined in LndClient.Data.Newtype

FromJSON Seconds 
Instance details

Defined in LndClient.Data.Newtype

Methods

parseJSON :: Value -> Parser Seconds #

parseJSONList :: Value -> Parser [Seconds] #

FromJSON LoggingMeta 
Instance details

Defined in LndClient.Data.Type

Methods

parseJSON :: Value -> Parser LoggingMeta #

parseJSONList :: Value -> Parser [LoggingMeta] #

FromJSON Block 
Instance details

Defined in Network.Bitcoin.BlockChain

Methods

parseJSON :: Value -> Parser Block #

parseJSONList :: Value -> Parser [Block] #

FromJSON BlockChainInfo 
Instance details

Defined in Network.Bitcoin.BlockChain

Methods

parseJSON :: Value -> Parser BlockChainInfo #

parseJSONList :: Value -> Parser [BlockChainInfo] #

FromJSON BlockVerbose 
Instance details

Defined in Network.Bitcoin.BlockChain

Methods

parseJSON :: Value -> Parser BlockVerbose #

parseJSONList :: Value -> Parser [BlockVerbose] #

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 BitcoinRpcError 
Instance details

Defined in Network.Bitcoin.Internal

Methods

parseJSON :: Value -> Parser BitcoinRpcError #

parseJSONList :: Value -> Parser [BitcoinRpcError] #

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 BlockInfo 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

parseJSON :: Value -> Parser BlockInfo #

parseJSONList :: Value -> Parser [BlockInfo] #

FromJSON DecodedPsbt 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

parseJSON :: Value -> Parser DecodedPsbt #

parseJSONList :: Value -> Parser [DecodedPsbt] #

FromJSON DecodedRawTransaction 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

parseJSON :: Value -> Parser DecodedRawTransaction #

parseJSONList :: Value -> Parser [DecodedRawTransaction] #

FromJSON RawSignedTransaction 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

parseJSON :: Value -> Parser RawSignedTransaction #

parseJSONList :: Value -> Parser [RawSignedTransaction] #

FromJSON RawTransactionInfo 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

parseJSON :: Value -> Parser RawTransactionInfo #

parseJSONList :: Value -> Parser [RawTransactionInfo] #

FromJSON ScriptPubKey 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

parseJSON :: Value -> Parser ScriptPubKey #

parseJSONList :: Value -> Parser [ScriptPubKey] #

FromJSON ScriptSig 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

parseJSON :: Value -> Parser ScriptSig #

parseJSONList :: Value -> Parser [ScriptSig] #

FromJSON TxIn 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

parseJSON :: Value -> Parser TxIn #

parseJSONList :: Value -> Parser [TxIn] #

FromJSON TxOut 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

parseJSON :: Value -> Parser TxOut #

parseJSONList :: Value -> Parser [TxOut] #

FromJSON TxnOutputType 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

parseJSON :: Value -> Parser TxnOutputType #

parseJSONList :: Value -> Parser [TxnOutputType] #

FromJSON UnspentTransaction 
Instance details

Defined in Network.Bitcoin.RawTransaction

Methods

parseJSON :: Value -> Parser UnspentTransaction #

parseJSONList :: Value -> Parser [UnspentTransaction] #

FromJSON TransactionID 
Instance details

Defined in Network.Bitcoin.Types

Methods

parseJSON :: Value -> Parser TransactionID #

parseJSONList :: Value -> Parser [TransactionID] #

FromJSON AddrInfo 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

parseJSON :: Value -> Parser AddrInfo #

parseJSONList :: Value -> Parser [AddrInfo] #

FromJSON AddressInfo 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

parseJSON :: Value -> Parser AddressInfo #

parseJSONList :: Value -> Parser [AddressInfo] #

FromJSON BitcoindInfo 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

parseJSON :: Value -> Parser BitcoindInfo #

parseJSONList :: Value -> Parser [BitcoindInfo] #

FromJSON DetailedTransaction 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

parseJSON :: Value -> Parser DetailedTransaction #

parseJSONList :: Value -> Parser [DetailedTransaction] #

FromJSON DetailedTransactionDetails 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

parseJSON :: Value -> Parser DetailedTransactionDetails #

parseJSONList :: Value -> Parser [DetailedTransactionDetails] #

FromJSON IsValid 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

parseJSON :: Value -> Parser IsValid #

parseJSONList :: Value -> Parser [IsValid] #

FromJSON ReceivedByAccount 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

parseJSON :: Value -> Parser ReceivedByAccount #

parseJSONList :: Value -> Parser [ReceivedByAccount] #

FromJSON ReceivedByAddress 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

parseJSON :: Value -> Parser ReceivedByAddress #

parseJSONList :: Value -> Parser [ReceivedByAddress] #

FromJSON ScrPubKey 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

parseJSON :: Value -> Parser ScrPubKey #

parseJSONList :: Value -> Parser [ScrPubKey] #

FromJSON SimpleTransaction 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

parseJSON :: Value -> Parser SimpleTransaction #

parseJSONList :: Value -> Parser [SimpleTransaction] #

FromJSON SinceBlock 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

parseJSON :: Value -> Parser SinceBlock #

parseJSONList :: Value -> Parser [SinceBlock] #

FromJSON TransactionCategory 
Instance details

Defined in Network.Bitcoin.Wallet

Methods

parseJSON :: Value -> Parser TransactionCategory #

parseJSONList :: Value -> Parser [TransactionCategory] #

FromJSON PersistValue 
Instance details

Defined in Database.Persist.PersistValue

FromJSON PostgresConf 
Instance details

Defined in Database.Persist.Postgresql

FromJSON Scientific 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Text 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Text 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON CalendarDiffDays 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Day 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON DayOfWeek 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON DiffTime

This instance includes a bounds check to prevent maliciously large inputs to fill up the memory of the target system. You can newtype Scientific and provide your own instance using withScientific if you want to allow larger inputs.

Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON NominalDiffTime

This instance includes a bounds check to prevent maliciously large inputs to fill up the memory of the target system. You can newtype Scientific and provide your own instance using withScientific if you want to allow larger inputs.

Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON SystemTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON UTCTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON CalendarDiffTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON LocalTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON TimeOfDay 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON ZonedTime

Supported string formats:

YYYY-MM-DD HH:MM Z YYYY-MM-DD HH:MM:SS Z YYYY-MM-DD HH:MM:SS.SSS Z

The first space may instead be a T, and the second space is optional. The Z represents UTC. The Z may be replaced with a time zone offset of the form +0000 or -08:00, where the first two digits are hours, the : is optional and the second two digits (also optional) are minutes.

Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Month 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Quarter 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON QuarterOfYear 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON UUID 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Textarea 
Instance details

Defined in Yesod.Form.Fields

FromJSON Word8 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Integer

This instance includes a bounds check to prevent maliciously large inputs to fill up the memory of the target system. You can newtype Scientific and provide your own instance using withScientific if you want to allow larger inputs.

Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Natural 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON () 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser () #

parseJSONList :: Value -> Parser [()] #

FromJSON Bool 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Char 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Double 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Float 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Int 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Word 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON a => FromJSON (Identity a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON a => FromJSON (First a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON a => FromJSON (Last a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON a => FromJSON (First a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON a => FromJSON (Last a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

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 (Min a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Min a) #

parseJSONList :: Value -> Parser [Min a] #

FromJSON a => FromJSON (Option a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON a => FromJSON (WrappedMonoid a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON a => FromJSON (Dual a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON a => FromJSON (NonEmpty a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

(FromJSON a, Integral a) => FromJSON (Ratio a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON (TlsCert rel) Source # 
Instance details

Defined in BtcLsp.Grpc.Data

FromJSON (TlsData rel) Source # 
Instance details

Defined in BtcLsp.Grpc.Data

FromJSON (TlsKey rel) Source # 
Instance details

Defined in BtcLsp.Grpc.Data

Methods

parseJSON :: Value -> Parser (TlsKey rel) #

parseJSONList :: Value -> Parser [TlsKey rel] #

FromJSON a => FromJSON (IntMap a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

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 v => FromJSON (Tree v) 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON1 f => FromJSON (Fix f)

Since: aeson-1.5.3.0

Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Fix f) #

parseJSONList :: Value -> Parser [Fix f] #

(FromJSON1 f, Functor f) => FromJSON (Mu f)

Since: aeson-1.5.3.0

Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Mu f) #

parseJSONList :: Value -> Parser [Mu f] #

(FromJSON1 f, Functor f) => FromJSON (Nu f)

Since: aeson-1.5.3.0

Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Nu f) #

parseJSONList :: Value -> Parser [Nu f] #

FromJSON a => FromJSON (DNonEmpty a)

Since: aeson-1.5.3.0

Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON a => FromJSON (DList a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON a => FromJSON (Item a) 
Instance details

Defined in Katip.Core

FromJSON a => FromJSON (BitcoinRpcResponse a) 
Instance details

Defined in Network.Bitcoin.Internal

Methods

parseJSON :: Value -> Parser (BitcoinRpcResponse a) #

parseJSONList :: Value -> Parser [BitcoinRpcResponse a] #

FromJSON (Key Block) Source # 
Instance details

Defined in BtcLsp.Storage.Model

FromJSON (Key LnChan) Source # 
Instance details

Defined in BtcLsp.Storage.Model

FromJSON (Key SwapIntoLn) Source # 
Instance details

Defined in BtcLsp.Storage.Model

FromJSON (Key SwapUtxo) Source # 
Instance details

Defined in BtcLsp.Storage.Model

FromJSON (Key User) Source # 
Instance details

Defined in BtcLsp.Storage.Model

(BackendCompatible b s, FromJSON (BackendKey b)) => FromJSON (BackendKey (Compatible b s)) 
Instance details

Defined in Database.Persist.Compatible.Types

(PersistCore b, PersistCore (RawPostgresql b), FromJSON (BackendKey b)) => FromJSON (BackendKey (RawPostgresql b)) 
Instance details

Defined in Database.Persist.Postgresql

FromJSON a => FromJSON (Array a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

(Prim a, FromJSON a) => FromJSON (PrimArray a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON a => FromJSON (SmallArray a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON a => FromJSON (Maybe a)

Since: aeson-1.5.3.0

Instance details

Defined in Data.Aeson.Types.FromJSON

(Eq a, Hashable a, FromJSON a) => FromJSON (HashSet a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON a => FromJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

(Prim a, FromJSON a) => FromJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

(Storable a, FromJSON a) => FromJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

(Vector Vector a, FromJSON a) => FromJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON a => FromJSON (Maybe a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON a => FromJSON [a] 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser [a] #

parseJSONList :: Value -> Parser [[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] #

HasResolution a => FromJSON (Fixed a)

This instance includes a bounds check to prevent maliciously large inputs to fill up the memory of the target system. You can newtype Scientific and provide your own instance using withScientific if you want to allow larger inputs.

Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON (Proxy a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

(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 a, FromJSON b) => FromJSON (Either a b)

Since: aeson-1.5.3.0

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 (These a b)

Since: aeson-1.5.3.0

Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (These a b) #

parseJSONList :: Value -> Parser [These a b] #

(FromJSON a, FromJSON b) => FromJSON (Pair a b)

Since: aeson-1.5.3.0

Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Pair a b) #

parseJSONList :: Value -> Parser [Pair a b] #

(FromJSON a, FromJSON b) => FromJSON (These a b)

Since: aeson-1.5.1.0

Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (These a b) #

parseJSONList :: Value -> Parser [These a b] #

(FromJSON v, FromJSONKey k, Eq k, Hashable k) => FromJSON (HashMap k v) 
Instance details

Defined in Data.Aeson.Types.FromJSON

(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 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] #

(FromJSON1 f, FromJSON1 g, FromJSON a) => FromJSON (These1 f g a)

Since: aeson-1.5.1.0

Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (These1 f g a) #

parseJSONList :: Value -> Parser [These1 f g a] #

(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)] #

(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 (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 (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 (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)] #

(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 FromJSONKey a where #

Read the docs for ToJSONKey first. This class is a conversion in the opposite direction. If you have a newtype wrapper around Text, the recommended way to define instances is with generalized newtype deriving:

newtype SomeId = SomeId { getSomeId :: Text }
  deriving (Eq,Ord,Hashable,FromJSONKey)

If you have a sum of nullary constructors, you may use the generic implementation:

data Color = Red | Green | Blue
  deriving Generic

instance FromJSONKey Color where
  fromJSONKey = genericFromJSONKey defaultJSONKeyOptions

Minimal complete definition

Nothing

Methods

fromJSONKey :: FromJSONKeyFunction a #

Strategy for parsing the key of a map-like container.

fromJSONKeyList :: FromJSONKeyFunction [a] #

This is similar in spirit to the readList method of Read. It makes it possible to give String keys special treatment without using OverlappingInstances. End users should always be able to use the default implementation of this method.

Instances

Instances details
FromJSONKey Version 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Int16 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Int32 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Int64 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Int8 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Word16 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Word32 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Word64 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Offset 
Instance details

Defined in Chronos

FromJSONKey Text 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Text 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Day 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey DayOfWeek 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey UTCTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey LocalTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey TimeOfDay 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey ZonedTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Month 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Quarter 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey QuarterOfYear 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey UUID 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Word8 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Integer 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Natural 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Bool 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Char 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Double 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Float 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Int 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Word 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey a => FromJSONKey (Identity a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

(FromJSONKey a, FromJSON a) => FromJSONKey [a] 
Instance details

Defined in Data.Aeson.Types.FromJSON

(FromJSON a, FromJSON b) => FromJSONKey (a, b) 
Instance details

Defined in Data.Aeson.Types.FromJSON

(FromJSON a, FromJSONKey a) => FromJSONKey (Const a b) 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey b => FromJSONKey (Tagged a b) 
Instance details

Defined in Data.Aeson.Types.FromJSON

(FromJSON a, FromJSON b, FromJSON c) => FromJSONKey (a, b, c) 
Instance details

Defined in Data.Aeson.Types.FromJSON

(FromJSON a, FromJSON b, FromJSON c, FromJSON d) => FromJSONKey (a, b, c, d) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction (a, b, c, d) #

fromJSONKeyList :: FromJSONKeyFunction [(a, b, c, d)] #

camelTo2 :: Char -> String -> String #

Better version of camelTo. Example where it works better:

camelTo '_' 'CamelAPICase' == "camel_apicase"
camelTo2 '_' 'CamelAPICase' == "camel_api_case"

data Options #

Options that specify how to encode/decode your datatype to/from JSON.

Options can be set using record syntax on defaultOptions with the fields below.

Instances

Instances details
Show Options 
Instance details

Defined in Data.Aeson.Types.Internal

(<**>) :: Applicative f => f a -> f (a -> b) -> f b infixl 4 #

A variant of <*> with the arguments reversed.

data Handle #

Haskell defines operations to read and write characters from and to files, represented by values of type Handle. Each value of this type is a handle: a record used by the Haskell run-time system to manage I/O with file system objects. A handle has at least the following properties:

  • whether it manages input or output or both;
  • whether it is open, closed or semi-closed;
  • whether the object is seekable;
  • whether buffering is disabled, or enabled on a line or block basis;
  • a buffer (whose length may be zero).

Most handles will also have a current I/O position indicating where the next input or output operation will occur. A handle is readable if it manages only input or both input and output; likewise, it is writable if it manages only output or both input and output. A handle is open when first allocated. Once it is closed it can no longer be used for either input or output, though an implementation cannot re-use its storage while references remain to it. Handles are in the Show and Eq classes. The string produced by showing a handle is system dependent; it should include enough information to identify the handle for debugging. A handle is equal according to == only to itself; no attempt is made to compare the internal state of different handles for equality.

Instances

Instances details
Show Handle

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Handle.Types

Eq Handle

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Handle.Types

Methods

(==) :: Handle -> Handle -> Bool #

(/=) :: Handle -> Handle -> Bool #

class Bifunctor (p :: Type -> Type -> Type) where #

A bifunctor is a type constructor that takes two type arguments and is a functor in both arguments. That is, unlike with Functor, a type constructor such as Either does not need to be partially applied for a Bifunctor instance, and the methods in this class permit mapping functions over the Left value or the Right value, or both at the same time.

Formally, the class Bifunctor represents a bifunctor from Hask -> Hask.

Intuitively it is a bifunctor where both the first and second arguments are covariant.

You can define a Bifunctor by either defining bimap or by defining both first and second.

If you supply bimap, you should ensure that:

bimap id idid

If you supply first and second, ensure:

first idid
second idid

If you supply both, you should also ensure:

bimap f g ≡ first f . second g

These ensure by parametricity:

bimap  (f . g) (h . i) ≡ bimap f h . bimap g i
first  (f . g) ≡ first  f . first  g
second (f . g) ≡ second f . second g

Since: base-4.8.0.0

Minimal complete definition

bimap | first, second

Methods

bimap :: (a -> b) -> (c -> d) -> p a c -> p b d #

Map over both arguments at the same time.

bimap f g ≡ first f . second g

Examples

Expand
>>> bimap toUpper (+1) ('j', 3)
('J',4)
>>> bimap toUpper (+1) (Left 'j')
Left 'J'
>>> bimap toUpper (+1) (Right 3)
Right 4

first :: (a -> b) -> p a c -> p b c #

Map covariantly over the first argument.

first f ≡ bimap f id

Examples

Expand
>>> first toUpper ('j', 3)
('J',3)
>>> first toUpper (Left 'j')
Left 'J'

second :: (b -> c) -> p a b -> p a c #

Map covariantly over the second argument.

secondbimap id

Examples

Expand
>>> second (+1) ('j', 3)
('j',4)
>>> second (+1) (Right 3)
Right 4

Instances

Instances details
Bifunctor Either

Since: base-4.8.0.0

Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> Either a c -> Either b d #

first :: (a -> b) -> Either a c -> Either b c #

second :: (b -> c) -> Either a b -> Either a c #

Bifunctor Arg

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

bimap :: (a -> b) -> (c -> d) -> Arg a c -> Arg b d #

first :: (a -> b) -> Arg a c -> Arg b c #

second :: (b -> c) -> Arg a b -> Arg a c #

Bifunctor Gr 
Instance details

Defined in Data.Graph.Inductive.PatriciaTree

Methods

bimap :: (a -> b) -> (c -> d) -> Gr a c -> Gr b d #

first :: (a -> b) -> Gr a c -> Gr b c #

second :: (b -> c) -> Gr a b -> Gr a c #

Bifunctor Either 
Instance details

Defined in Data.Strict.Either

Methods

bimap :: (a -> b) -> (c -> d) -> Either a c -> Either b d #

first :: (a -> b) -> Either a c -> Either b c #

second :: (b -> c) -> Either a b -> Either a c #

Bifunctor These 
Instance details

Defined in Data.Strict.These

Methods

bimap :: (a -> b) -> (c -> d) -> These a c -> These b d #

first :: (a -> b) -> These a c -> These b c #

second :: (b -> c) -> These a b -> These a c #

Bifunctor Pair 
Instance details

Defined in Data.Strict.Tuple

Methods

bimap :: (a -> b) -> (c -> d) -> Pair a c -> Pair b d #

first :: (a -> b) -> Pair a c -> Pair b c #

second :: (b -> c) -> Pair a b -> Pair a c #

Bifunctor These 
Instance details

Defined in Data.These

Methods

bimap :: (a -> b) -> (c -> d) -> These a c -> These b d #

first :: (a -> b) -> These a c -> These b c #

second :: (b -> c) -> These a b -> These a c #

Bifunctor (,)

Since: base-4.8.0.0

Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> (a, c) -> (b, d) #

first :: (a -> b) -> (a, c) -> (b, c) #

second :: (b -> c) -> (a, b) -> (a, c) #

Bifunctor (Const :: Type -> Type -> Type)

Since: base-4.8.0.0

Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> Const a c -> Const b d #

first :: (a -> b) -> Const a c -> Const b c #

second :: (b -> c) -> Const a b -> Const a c #

Functor f => Bifunctor (FreeF f) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

bimap :: (a -> b) -> (c -> d) -> FreeF f a c -> FreeF f b d #

first :: (a -> b) -> FreeF f a c -> FreeF f b c #

second :: (b -> c) -> FreeF f a b -> FreeF f a c #

Bifunctor (Tagged :: Type -> Type -> Type) 
Instance details

Defined in Data.Tagged

Methods

bimap :: (a -> b) -> (c -> d) -> Tagged a c -> Tagged b d #

first :: (a -> b) -> Tagged a c -> Tagged b c #

second :: (b -> c) -> Tagged a b -> Tagged a c #

Bifunctor (Constant :: Type -> Type -> Type) 
Instance details

Defined in Data.Functor.Constant

Methods

bimap :: (a -> b) -> (c -> d) -> Constant a c -> Constant b d #

first :: (a -> b) -> Constant a c -> Constant b c #

second :: (b -> c) -> Constant a b -> Constant a c #

Bifunctor ((,,) x1)

Since: base-4.8.0.0

Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> (x1, a, c) -> (x1, b, d) #

first :: (a -> b) -> (x1, a, c) -> (x1, b, c) #

second :: (b -> c) -> (x1, a, b) -> (x1, a, c) #

Bifunctor (K1 i :: Type -> Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> K1 i a c -> K1 i b d #

first :: (a -> b) -> K1 i a c -> K1 i b c #

second :: (b -> c) -> K1 i a b -> K1 i a c #

Bifunctor ((,,,) x1 x2)

Since: base-4.8.0.0

Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> (x1, x2, a, c) -> (x1, x2, b, d) #

first :: (a -> b) -> (x1, x2, a, c) -> (x1, x2, b, c) #

second :: (b -> c) -> (x1, x2, a, b) -> (x1, x2, a, c) #

Functor f => Bifunctor (Clown f :: Type -> Type -> Type) 
Instance details

Defined in Data.Bifunctor.Clown

Methods

bimap :: (a -> b) -> (c -> d) -> Clown f a c -> Clown f b d #

first :: (a -> b) -> Clown f a c -> Clown f b c #

second :: (b -> c) -> Clown f a b -> Clown f a c #

Bifunctor p => Bifunctor (Flip p) 
Instance details

Defined in Data.Bifunctor.Flip

Methods

bimap :: (a -> b) -> (c -> d) -> Flip p a c -> Flip p b d #

first :: (a -> b) -> Flip p a c -> Flip p b c #

second :: (b -> c) -> Flip p a b -> Flip p a c #

Functor g => Bifunctor (Joker g :: Type -> Type -> Type) 
Instance details

Defined in Data.Bifunctor.Joker

Methods

bimap :: (a -> b) -> (c -> d) -> Joker g a c -> Joker g b d #

first :: (a -> b) -> Joker g a c -> Joker g b c #

second :: (b -> c) -> Joker g a b -> Joker g a c #

Bifunctor p => Bifunctor (WrappedBifunctor p) 
Instance details

Defined in Data.Bifunctor.Wrapped

Methods

bimap :: (a -> b) -> (c -> d) -> WrappedBifunctor p a c -> WrappedBifunctor p b d #

first :: (a -> b) -> WrappedBifunctor p a c -> WrappedBifunctor p b c #

second :: (b -> c) -> WrappedBifunctor p a b -> WrappedBifunctor p a c #

Bifunctor ((,,,,) x1 x2 x3)

Since: base-4.8.0.0

Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> (x1, x2, x3, a, c) -> (x1, x2, x3, b, d) #

first :: (a -> b) -> (x1, x2, x3, a, c) -> (x1, x2, x3, b, c) #

second :: (b -> c) -> (x1, x2, x3, a, b) -> (x1, x2, x3, a, c) #

(Bifunctor f, Bifunctor g) => Bifunctor (Product f g) 
Instance details

Defined in Data.Bifunctor.Product

Methods

bimap :: (a -> b) -> (c -> d) -> Product f g a c -> Product f g b d #

first :: (a -> b) -> Product f g a c -> Product f g b c #

second :: (b -> c) -> Product f g a b -> Product f g a c #

(Bifunctor p, Bifunctor q) => Bifunctor (Sum p q) 
Instance details

Defined in Data.Bifunctor.Sum

Methods

bimap :: (a -> b) -> (c -> d) -> Sum p q a c -> Sum p q b d #

first :: (a -> b) -> Sum p q a c -> Sum p q b c #

second :: (b -> c) -> Sum p q a b -> Sum p q a c #

Bifunctor ((,,,,,) x1 x2 x3 x4)

Since: base-4.8.0.0

Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> (x1, x2, x3, x4, a, c) -> (x1, x2, x3, x4, b, d) #

first :: (a -> b) -> (x1, x2, x3, x4, a, c) -> (x1, x2, x3, x4, b, c) #

second :: (b -> c) -> (x1, x2, x3, x4, a, b) -> (x1, x2, x3, x4, a, c) #

(Functor f, Bifunctor p) => Bifunctor (Tannen f p) 
Instance details

Defined in Data.Bifunctor.Tannen

Methods

bimap :: (a -> b) -> (c -> d) -> Tannen f p a c -> Tannen f p b d #

first :: (a -> b) -> Tannen f p a c -> Tannen f p b c #

second :: (b -> c) -> Tannen f p a b -> Tannen f p a c #

Bifunctor ((,,,,,,) x1 x2 x3 x4 x5)

Since: base-4.8.0.0

Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> (x1, x2, x3, x4, x5, a, c) -> (x1, x2, x3, x4, x5, b, d) #

first :: (a -> b) -> (x1, x2, x3, x4, x5, a, c) -> (x1, x2, x3, x4, x5, b, c) #

second :: (b -> c) -> (x1, x2, x3, x4, x5, a, b) -> (x1, x2, x3, x4, x5, a, c) #

(Bifunctor p, Functor f, Functor g) => Bifunctor (Biff p f g) 
Instance details

Defined in Data.Bifunctor.Biff

Methods

bimap :: (a -> b) -> (c -> d) -> Biff p f g a c -> Biff p f g b d #

first :: (a -> b) -> Biff p f g a c -> Biff p f g b c #

second :: (b -> c) -> Biff p f g a b -> Biff p f g a c #

linkOnly #

Arguments

:: (SomeException -> Bool)

return True if the exception should be propagated, False otherwise.

-> Async a 
-> IO () 

Link the given Async to the current thread, such that if the Async raises an exception, that exception will be re-thrown in the current thread, wrapped in ExceptionInLinkedThread.

The supplied predicate determines which exceptions in the target thread should be propagated to the source thread.

waitAnyCancel :: [Async a] -> IO (Async a, a) #

Like waitAny, but also cancels the other asynchronous operations as soon as one has completed.

waitAnySTM :: [Async a] -> STM (Async a, a) #

A version of waitAny that can be used inside an STM transaction.

Since: async-2.1.0

cancel :: Async a -> IO () #

Cancel an asynchronous action by throwing the AsyncCancelled exception to it, and waiting for the Async thread to quit. Has no effect if the Async has already completed.

cancel a = throwTo (asyncThreadId a) AsyncCancelled <* waitCatch a

Note that cancel will not terminate until the thread the Async refers to has terminated. This means that cancel will block for as long said thread blocks when receiving an asynchronous exception.

For example, it could block if:

  • It's executing a foreign call, and thus cannot receive the asynchronous exception;
  • It's executing some cleanup handler after having received the exception, and the handler is blocking.

wait :: Async a -> IO a #

Wait for an asynchronous action to complete, and return its value. If the asynchronous action threw an exception, then the exception is re-thrown by wait.

wait = atomically . waitSTM

data Async a #

An asynchronous action spawned by async or withAsync. Asynchronous actions are executed in a separate thread, and operations are provided for waiting for asynchronous actions to complete and obtaining their results (see e.g. wait).

Instances

Instances details
Functor Async 
Instance details

Defined in Control.Concurrent.Async

Methods

fmap :: (a -> b) -> Async a -> Async b #

(<$) :: a -> Async b -> Async a #

Eq (Async a) 
Instance details

Defined in Control.Concurrent.Async

Methods

(==) :: Async a -> Async a -> Bool #

(/=) :: Async a -> Async a -> Bool #

Ord (Async a) 
Instance details

Defined in Control.Concurrent.Async

Methods

compare :: Async a -> Async a -> Ordering #

(<) :: Async a -> Async a -> Bool #

(<=) :: Async a -> Async a -> Bool #

(>) :: Async a -> Async a -> Bool #

(>=) :: Async a -> Async a -> Bool #

max :: Async a -> Async a -> Async a #

min :: Async a -> Async a -> Async a #

Hashable (Async a) 
Instance details

Defined in Control.Concurrent.Async

Methods

hashWithSalt :: Int -> Async a -> Int #

hash :: Async a -> Int #

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

Instances details
Alternative IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

empty :: IResult a #

(<|>) :: IResult a -> IResult a -> IResult a #

some :: IResult a -> IResult [a] #

many :: IResult a -> IResult [a] #

Alternative Parser 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

empty :: Parser a #

(<|>) :: Parser a -> Parser a -> Parser a #

some :: Parser a -> Parser [a] #

many :: Parser a -> Parser [a] #

Alternative Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

empty :: Result a #

(<|>) :: Result a -> Result a -> Result a #

some :: Result a -> Result [a] #

many :: Result a -> Result [a] #

Alternative Concurrently 
Instance details

Defined in Control.Concurrent.Async

Alternative ZipList

Since: base-4.11.0.0

Instance details

Defined in Control.Applicative

Methods

empty :: ZipList a #

(<|>) :: ZipList a -> ZipList a -> ZipList a #

some :: ZipList a -> ZipList [a] #

many :: ZipList a -> ZipList [a] #

Alternative 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 STM

Since: base-4.8.0.0

Instance details

Defined in GHC.Conc.Sync

Methods

empty :: STM a #

(<|>) :: STM a -> STM a -> STM a #

some :: STM a -> STM [a] #

many :: STM a -> STM [a] #

Alternative P

Since: base-4.5.0.0

Instance details

Defined in Text.ParserCombinators.ReadP

Methods

empty :: P a #

(<|>) :: P a -> P a -> P a #

some :: P a -> P [a] #

many :: P a -> P [a] #

Alternative ReadP

Since: base-4.6.0.0

Instance details

Defined in Text.ParserCombinators.ReadP

Methods

empty :: ReadP a #

(<|>) :: ReadP a -> ReadP a -> ReadP a #

some :: ReadP a -> ReadP [a] #

many :: ReadP a -> ReadP [a] #

Alternative 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 Get

Since: binary-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 DList 
Instance details

Defined in Data.DList.Internal

Methods

empty :: DList a #

(<|>) :: DList a -> DList a -> DList a #

some :: DList a -> DList [a] #

many :: DList a -> DList [a] #

Alternative IO

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

empty :: IO a #

(<|>) :: IO a -> IO a -> IO a #

some :: IO a -> IO [a] #

many :: IO a -> IO [a] #

Alternative Conversion 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Alternative RowParser 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Methods

empty :: RowParser a #

(<|>) :: RowParser a -> RowParser a -> RowParser a #

some :: RowParser a -> RowParser [a] #

many :: RowParser a -> RowParser [a] #

Alternative Array 
Instance details

Defined in Data.Primitive.Array

Methods

empty :: Array a #

(<|>) :: Array a -> Array a -> Array a #

some :: Array a -> Array [a] #

many :: Array a -> Array [a] #

Alternative SmallArray 
Instance details

Defined in Data.Primitive.SmallArray

Alternative 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 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 FormResult

Since: yesod-form-1.4.15

Instance details

Defined in Yesod.Form.Types

Alternative Maybe

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

empty :: Maybe a #

(<|>) :: Maybe a -> Maybe a -> Maybe a #

some :: Maybe a -> Maybe [a] #

many :: Maybe a -> Maybe [a] #

Alternative []

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

empty :: [a] #

(<|>) :: [a] -> [a] -> [a] #

some :: [a] -> [[a]] #

many :: [a] -> [[a]] #

Alternative (Parser i) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

empty :: Parser i a #

(<|>) :: Parser i a -> Parser i a -> Parser i a #

some :: Parser i a -> Parser i [a] #

many :: Parser i a -> Parser i [a] #

MonadPlus m => Alternative (WrappedMonad m)

Since: base-2.1

Instance details

Defined in Control.Applicative

Methods

empty :: WrappedMonad m a #

(<|>) :: WrappedMonad m a -> WrappedMonad m a -> WrappedMonad m a #

some :: WrappedMonad m a -> WrappedMonad m [a] #

many :: WrappedMonad m a -> WrappedMonad m [a] #

ArrowPlus a => Alternative (ArrowMonad a)

Since: base-4.6.0.0

Instance details

Defined in Control.Arrow

Methods

empty :: ArrowMonad a a0 #

(<|>) :: ArrowMonad a a0 -> ArrowMonad a a0 -> ArrowMonad a a0 #

some :: ArrowMonad a a0 -> ArrowMonad a [a0] #

many :: ArrowMonad a a0 -> ArrowMonad a [a0] #

Alternative (Proxy :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Proxy

Methods

empty :: Proxy a #

(<|>) :: Proxy a -> Proxy a -> Proxy a #

some :: Proxy a -> Proxy [a] #

many :: Proxy a -> Proxy [a] #

Alternative (U1 :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

empty :: U1 a #

(<|>) :: U1 a -> U1 a -> U1 a #

some :: U1 a -> U1 [a] #

many :: U1 a -> U1 [a] #

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] #

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] #

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 r => Alternative (EitherR r) 
Instance details

Defined in Data.EitherR

Methods

empty :: EitherR r a #

(<|>) :: EitherR r a -> EitherR r a -> EitherR r a #

some :: EitherR r a -> EitherR r [a] #

many :: EitherR r a -> EitherR r [a] #

Monad m => Alternative (CatchT m) 
Instance details

Defined in Control.Monad.Catch.Pure

Methods

empty :: CatchT m a #

(<|>) :: CatchT m a -> CatchT m a -> CatchT m a #

some :: CatchT m a -> CatchT m [a] #

many :: CatchT m a -> CatchT m [a] #

Alternative v => Alternative (Free v)

This violates the Alternative laws, handle with care.

Instance details

Defined in Control.Monad.Free

Methods

empty :: Free v a #

(<|>) :: Free v a -> Free v a -> Free v a #

some :: Free v a -> Free v [a] #

many :: Free v a -> Free v [a] #

Alternative m => Alternative (KatipContextT m) 
Instance details

Defined in Katip.Monadic

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 m => Alternative (ResourceT m)

Since 1.1.5

Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

empty :: ResourceT m a #

(<|>) :: ResourceT m a -> ResourceT m a -> ResourceT m a #

some :: ResourceT m a -> ResourceT m [a] #

many :: ResourceT m a -> ResourceT m [a] #

Alternative f => Alternative (WrappedApplicative f) 
Instance details

Defined in Data.Functor.Bind.Class

Alternative f => Alternative (Lift f)

A combination is Pure only either part is.

Instance details

Defined in Control.Applicative.Lift

Methods

empty :: Lift f a #

(<|>) :: Lift f a -> Lift f a -> Lift f a #

some :: Lift f a -> Lift f [a] #

many :: Lift f a -> Lift f [a] #

Applicative m => Alternative (ListT m) 
Instance details

Defined in Control.Monad.Trans.List

Methods

empty :: ListT m a #

(<|>) :: ListT m a -> ListT m a -> ListT m a #

some :: ListT m a -> ListT m [a] #

many :: ListT m a -> ListT m [a] #

(Functor m, Monad m) => Alternative (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

empty :: MaybeT m a #

(<|>) :: MaybeT m a -> MaybeT m a -> MaybeT m a #

some :: MaybeT m a -> MaybeT m [a] #

many :: MaybeT m a -> MaybeT m [a] #

MonadUnliftIO m => Alternative (Conc m)

Since: unliftio-0.2.9.0

Instance details

Defined in UnliftIO.Internals.Async

Methods

empty :: Conc m a #

(<|>) :: Conc m a -> Conc m a -> Conc m a #

some :: Conc m a -> Conc m [a] #

many :: Conc m a -> Conc m [a] #

MonadUnliftIO m => Alternative (Concurrently m)

Composing two unlifted Concurrently values using Alternative is the equivalent to using a race combinator, the asynchrounous sub-routine that returns a value first is the one that gets it's value returned, the slowest sub-routine gets cancelled and it's thread is killed.

Since: unliftio-0.1.0.0

Instance details

Defined in UnliftIO.Internals.Async

Methods

empty :: Concurrently m a #

(<|>) :: Concurrently m a -> Concurrently m a -> Concurrently m a #

some :: Concurrently m a -> Concurrently m [a] #

many :: Concurrently m a -> Concurrently m [a] #

(ArrowZero a, ArrowPlus a) => Alternative (WrappedArrow a b)

Since: base-2.1

Instance details

Defined in Control.Applicative

Methods

empty :: WrappedArrow a b a0 #

(<|>) :: WrappedArrow a b a0 -> WrappedArrow a b a0 -> WrappedArrow a b a0 #

some :: WrappedArrow a b a0 -> WrappedArrow a b [a0] #

many :: WrappedArrow a b a0 -> WrappedArrow a b [a0] #

Alternative m => Alternative (Kleisli m a)

Since: base-4.14.0.0

Instance details

Defined in Control.Arrow

Methods

empty :: Kleisli m a a0 #

(<|>) :: Kleisli m a a0 -> Kleisli m a a0 -> Kleisli m a a0 #

some :: Kleisli m a a0 -> Kleisli m a [a0] #

many :: Kleisli m a a0 -> Kleisli m a [a0] #

Alternative f => Alternative (Ap f)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

empty :: Ap f a #

(<|>) :: Ap f a -> Ap f a -> Ap f a #

some :: Ap f a -> Ap f [a] #

many :: Ap f a -> Ap f [a] #

Alternative f => Alternative (Alt f)

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

empty :: Alt f a #

(<|>) :: Alt f a -> Alt f a -> Alt f a #

some :: Alt f a -> Alt f [a] #

many :: Alt f a -> Alt f [a] #

Alternative f => Alternative (Rec1 f)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

empty :: Rec1 f a #

(<|>) :: Rec1 f a -> Rec1 f a -> Rec1 f a #

some :: Rec1 f a -> Rec1 f [a] #

many :: Rec1 f a -> Rec1 f [a] #

(Monad m, Monoid r) => Alternative (ExceptRT r m) 
Instance details

Defined in Data.EitherR

Methods

empty :: ExceptRT r m a #

(<|>) :: ExceptRT r m a -> ExceptRT r m a -> ExceptRT r m a #

some :: ExceptRT r m a -> ExceptRT r m [a] #

many :: ExceptRT r m a -> ExceptRT r m [a] #

(Functor f, MonadPlus m) => Alternative (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

empty :: FreeT f m a #

(<|>) :: FreeT f m a -> FreeT f m a -> FreeT f m a #

some :: FreeT f m a -> FreeT f m [a] #

many :: FreeT f m a -> FreeT f m [a] #

Alternative f => Alternative (Backwards f)

Try alternatives in the same order as f.

Instance details

Defined in Control.Applicative.Backwards

Methods

empty :: Backwards f a #

(<|>) :: Backwards f a -> Backwards f a -> Backwards f a #

some :: Backwards f a -> Backwards f [a] #

many :: Backwards f a -> Backwards f [a] #

(Monoid w, Functor m, MonadPlus m) => Alternative (AccumT w m) 
Instance details

Defined in Control.Monad.Trans.Accum

Methods

empty :: AccumT w m a #

(<|>) :: AccumT w m a -> AccumT w m a -> AccumT w m a #

some :: AccumT w m a -> AccumT w m [a] #

many :: AccumT w m a -> AccumT w m [a] #

(Functor m, Monad m, Error e) => Alternative (ErrorT e m) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

empty :: ErrorT e m a #

(<|>) :: ErrorT e m a -> ErrorT e m a -> ErrorT e m a #

some :: ErrorT e m a -> ErrorT e m [a] #

many :: ErrorT e m a -> ErrorT e m [a] #

(Functor m, Monad m, Monoid e) => Alternative (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

empty :: ExceptT e m a #

(<|>) :: ExceptT e m a -> ExceptT e m a -> ExceptT e m a #

some :: ExceptT e m a -> ExceptT e m [a] #

many :: ExceptT e m a -> ExceptT e m [a] #

Alternative m => Alternative (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

empty :: IdentityT m a #

(<|>) :: IdentityT m a -> IdentityT m a -> IdentityT m a #

some :: IdentityT m a -> IdentityT m [a] #

many :: IdentityT m a -> IdentityT m [a] #

Alternative m => Alternative (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

empty :: ReaderT r m a #

(<|>) :: ReaderT r m a -> ReaderT r m a -> ReaderT r m a #

some :: ReaderT r m a -> ReaderT r m [a] #

many :: ReaderT r m a -> ReaderT r m [a] #

(Functor m, MonadPlus m) => Alternative (SelectT r m) 
Instance details

Defined in Control.Monad.Trans.Select

Methods

empty :: SelectT r m a #

(<|>) :: SelectT r m a -> SelectT r m a -> SelectT r m a #

some :: SelectT r m a -> SelectT r m [a] #

many :: SelectT r m a -> SelectT r m [a] #

(Functor m, MonadPlus m) => Alternative (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Lazy

Methods

empty :: StateT s m a #

(<|>) :: StateT s m a -> StateT s m a -> StateT s m a #

some :: StateT s m a -> StateT s m [a] #

many :: StateT s m a -> StateT s m [a] #

(Functor m, MonadPlus m) => Alternative (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

empty :: StateT s m a #

(<|>) :: StateT s m a -> StateT s m a -> StateT s m a #

some :: StateT s m a -> StateT s m [a] #

many :: StateT s m a -> StateT s m [a] #

(Functor m, MonadPlus m) => Alternative (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.CPS

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.Lazy

Methods

empty :: WriterT w m a #

(<|>) :: WriterT w m a -> WriterT w m a -> WriterT w m a #

some :: WriterT w m a -> WriterT w m [a] #

many :: WriterT w m a -> WriterT w m [a] #

(Monoid w, Alternative m) => Alternative (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

empty :: WriterT w m a #

(<|>) :: WriterT w m a -> WriterT w m a -> WriterT w m a #

some :: WriterT w m a -> WriterT w m [a] #

many :: WriterT w m a -> WriterT w m [a] #

Alternative f => Alternative (Reverse f)

Derived instance.

Instance details

Defined in Data.Functor.Reverse

Methods

empty :: Reverse f a #

(<|>) :: Reverse f a -> Reverse f a -> Reverse f a #

some :: Reverse f a -> Reverse f [a] #

many :: Reverse f a -> Reverse f [a] #

(Alternative f, Alternative g) => Alternative (Product f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Product

Methods

empty :: Product f g a #

(<|>) :: Product f g a -> Product f g a -> Product f g a #

some :: Product f g a -> Product f g [a] #

many :: Product f g a -> Product f g [a] #

(Alternative f, Alternative g) => Alternative (f :*: g)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

empty :: (f :*: g) a #

(<|>) :: (f :*: g) a -> (f :*: g) a -> (f :*: g) a #

some :: (f :*: g) a -> (f :*: g) [a] #

many :: (f :*: g) a -> (f :*: g) [a] #

(Alternative f, Applicative g) => Alternative (Compose f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

empty :: Compose f g a #

(<|>) :: Compose f g a -> Compose f g a -> Compose f g a #

some :: Compose f g a -> Compose f g [a] #

many :: Compose f g a -> Compose f g [a] #

(Alternative f, Applicative g) => Alternative (f :.: g)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

empty :: (f :.: g) a #

(<|>) :: (f :.: g) a -> (f :.: g) a -> (f :.: g) a #

some :: (f :.: g) a -> (f :.: g) [a] #

many :: (f :.: g) a -> (f :.: g) [a] #

Alternative f => Alternative (M1 i c f)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

empty :: M1 i c f a #

(<|>) :: M1 i c f a -> M1 i c f a -> M1 i c f a #

some :: M1 i c f a -> M1 i c f [a] #

many :: M1 i c f a -> M1 i c f [a] #

(Functor m, MonadPlus m) => Alternative (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.CPS

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.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

Instances details
MonadPlus IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

mzero :: IResult a #

mplus :: IResult a -> IResult a -> IResult a #

MonadPlus Parser 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

mzero :: Parser a #

mplus :: Parser a -> Parser a -> Parser a #

MonadPlus Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

mzero :: Result a #

mplus :: Result a -> Result a -> Result a #

MonadPlus 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 P

Since: base-2.1

Instance details

Defined in Text.ParserCombinators.ReadP

Methods

mzero :: P a #

mplus :: P a -> P a -> P a #

MonadPlus ReadP

Since: base-2.1

Instance details

Defined in Text.ParserCombinators.ReadP

Methods

mzero :: ReadP a #

mplus :: ReadP a -> ReadP a -> ReadP a #

MonadPlus ReadPrec

Since: base-2.1

Instance details

Defined in Text.ParserCombinators.ReadPrec

Methods

mzero :: ReadPrec a #

mplus :: ReadPrec a -> ReadPrec a -> ReadPrec a #

MonadPlus Get

Since: binary-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 DList 
Instance details

Defined in Data.DList.Internal

Methods

mzero :: DList a #

mplus :: DList a -> DList a -> DList a #

MonadPlus IO

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

mzero :: IO a #

mplus :: IO a -> IO a -> IO a #

MonadPlus Conversion 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

MonadPlus Array 
Instance details

Defined in Data.Primitive.Array

Methods

mzero :: Array a #

mplus :: Array a -> Array a -> Array a #

MonadPlus SmallArray 
Instance details

Defined in Data.Primitive.SmallArray

MonadPlus Result 
Instance details

Defined in Codec.QRCode.Data.Result

Methods

mzero :: Result a #

mplus :: Result a -> Result a -> Result a #

MonadPlus Vector 
Instance details

Defined in Data.Vector

Methods

mzero :: Vector a #

mplus :: Vector a -> Vector a -> Vector a #

MonadPlus Maybe

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

mzero :: Maybe a #

mplus :: Maybe a -> Maybe a -> Maybe a #

MonadPlus []

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

mzero :: [a] #

mplus :: [a] -> [a] -> [a] #

MonadPlus (Parser i) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

mzero :: Parser i a #

mplus :: Parser i a -> Parser i a -> Parser i a #

(ArrowApply a, ArrowPlus a) => MonadPlus (ArrowMonad a)

Since: base-4.6.0.0

Instance details

Defined in Control.Arrow

Methods

mzero :: ArrowMonad a a0 #

mplus :: ArrowMonad a a0 -> ArrowMonad a a0 -> ArrowMonad a a0 #

MonadPlus (Proxy :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Proxy

Methods

mzero :: Proxy a #

mplus :: Proxy a -> Proxy a -> Proxy a #

MonadPlus (U1 :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

mzero :: U1 a #

mplus :: U1 a -> U1 a -> U1 a #

Monoid r => MonadPlus (EitherR r) 
Instance details

Defined in Data.EitherR

Methods

mzero :: EitherR r a #

mplus :: EitherR r a -> EitherR r a -> EitherR r a #

Monad m => MonadPlus (CatchT m) 
Instance details

Defined in Control.Monad.Catch.Pure

Methods

mzero :: CatchT m a #

mplus :: CatchT m a -> CatchT m a -> CatchT m a #

(Functor v, MonadPlus v) => MonadPlus (Free v)

This violates the MonadPlus laws, handle with care.

Instance details

Defined in Control.Monad.Free

Methods

mzero :: Free v a #

mplus :: Free v a -> Free v a -> Free v a #

MonadPlus m => MonadPlus (KatipContextT m) 
Instance details

Defined in Katip.Monadic

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 m => MonadPlus (ResourceT m)

Since 1.1.5

Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

mzero :: ResourceT m a #

mplus :: ResourceT m a -> ResourceT m a -> ResourceT m a #

Monad m => MonadPlus (ListT m) 
Instance details

Defined in Control.Monad.Trans.List

Methods

mzero :: ListT m a #

mplus :: ListT m a -> ListT m a -> ListT m a #

Monad m => MonadPlus (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

mzero :: MaybeT m a #

mplus :: MaybeT m a -> MaybeT m a -> MaybeT m a #

MonadPlus m => MonadPlus (Kleisli m a)

Since: base-4.14.0.0

Instance details

Defined in Control.Arrow

Methods

mzero :: Kleisli m a a0 #

mplus :: Kleisli m a a0 -> Kleisli m a a0 -> Kleisli m a a0 #

MonadPlus f => MonadPlus (Ap f)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

mzero :: Ap f a #

mplus :: Ap f a -> Ap f a -> Ap f a #

MonadPlus f => MonadPlus (Alt f)

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

mzero :: Alt f a #

mplus :: Alt f a -> Alt f a -> Alt f a #

MonadPlus f => MonadPlus (Rec1 f)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

mzero :: Rec1 f a #

mplus :: Rec1 f a -> Rec1 f a -> Rec1 f a #

(Monad m, Monoid r) => MonadPlus (ExceptRT r m) 
Instance details

Defined in Data.EitherR

Methods

mzero :: ExceptRT r m a #

mplus :: ExceptRT r m a -> ExceptRT r m a -> ExceptRT r m a #

(Functor f, MonadPlus m) => MonadPlus (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

mzero :: FreeT f m a #

mplus :: FreeT f m a -> FreeT f m a -> FreeT f m a #

(Monoid w, Functor m, MonadPlus m) => MonadPlus (AccumT w m) 
Instance details

Defined in Control.Monad.Trans.Accum

Methods

mzero :: AccumT w m a #

mplus :: AccumT w m a -> AccumT w m a -> AccumT w m a #

(Monad m, Error e) => MonadPlus (ErrorT e m) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

mzero :: ErrorT e m a #

mplus :: ErrorT e m a -> ErrorT e m a -> ErrorT e m a #

(Monad m, Monoid e) => MonadPlus (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

mzero :: ExceptT e m a #

mplus :: ExceptT e m a -> ExceptT e m a -> ExceptT e m a #

MonadPlus m => MonadPlus (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

mzero :: IdentityT m a #

mplus :: IdentityT m a -> IdentityT m a -> IdentityT m a #

MonadPlus m => MonadPlus (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

mzero :: ReaderT r m a #

mplus :: ReaderT r m a -> ReaderT r m a -> ReaderT r m a #

MonadPlus m => MonadPlus (SelectT r m) 
Instance details

Defined in Control.Monad.Trans.Select

Methods

mzero :: SelectT r m a #

mplus :: SelectT r m a -> SelectT r m a -> SelectT r m a #

MonadPlus m => MonadPlus (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Lazy

Methods

mzero :: StateT s m a #

mplus :: StateT s m a -> StateT s m a -> StateT s m a #

MonadPlus m => MonadPlus (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

mzero :: StateT s m a #

mplus :: StateT s m a -> StateT s m a -> StateT s m a #

(Functor m, MonadPlus m) => MonadPlus (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.CPS

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.Lazy

Methods

mzero :: WriterT w m a #

mplus :: WriterT w m a -> WriterT w m a -> WriterT w m a #

(Monoid w, MonadPlus m) => MonadPlus (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

mzero :: WriterT w m a #

mplus :: WriterT w m a -> WriterT w m a -> WriterT w m a #

MonadPlus m => MonadPlus (Reverse m)

Derived instance.

Instance details

Defined in Data.Functor.Reverse

Methods

mzero :: Reverse m a #

mplus :: Reverse m a -> Reverse m a -> Reverse m a #

(MonadPlus f, MonadPlus g) => MonadPlus (Product f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Product

Methods

mzero :: Product f g a #

mplus :: Product f g a -> Product f g a -> Product f g a #

(MonadPlus f, MonadPlus g) => MonadPlus (f :*: g)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

mzero :: (f :*: g) a #

mplus :: (f :*: g) a -> (f :*: g) a -> (f :*: g) a #

MonadPlus f => MonadPlus (M1 i c f)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

mzero :: M1 i c f a #

mplus :: M1 i c f a -> M1 i c f a -> M1 i c f a #

(Functor m, MonadPlus m) => MonadPlus (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.CPS

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.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 #

newtype Compose (f :: k -> Type) (g :: k1 -> k) (a :: k1) 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

Instances details
TestEquality f => TestEquality (Compose f g :: k2 -> Type)

The deduction (via generativity) that if g x :~: g y then x :~: y.

Since: base-4.14.0.0

Instance details

Defined in Data.Functor.Compose

Methods

testEquality :: forall (a :: k) (b :: k). Compose f g a -> Compose f g b -> Maybe (a :~: b) #

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 :: forall (a :: k0). Compose f g a -> Rep1 (Compose f g) a #

to1 :: forall (a :: k0). Rep1 (Compose f g) a -> 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 #

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)) #

(Representable f, Representable g) => Representable (Compose f g) 
Instance details

Defined in Data.Functor.Rep

Associated Types

type Rep (Compose f g) #

Methods

tabulate :: (Rep (Compose f g) -> a) -> Compose f g a #

index :: Compose f g a -> Rep (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 #

(Foldable f, Foldable g) => Foldable (Compose f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

fold :: Monoid m => Compose f g m -> m #

foldMap :: Monoid m => (a -> m) -> Compose f g a -> m #

foldMap' :: Monoid m => (a -> m) -> Compose f g a -> m #

foldr :: (a -> b -> b) -> b -> Compose f g a -> b #

foldr' :: (a -> b -> b) -> b -> Compose f g a -> b #

foldl :: (b -> a -> b) -> b -> Compose f g a -> b #

foldl' :: (b -> a -> b) -> b -> Compose f g a -> b #

foldr1 :: (a -> a -> a) -> Compose f g a -> a #

foldl1 :: (a -> a -> a) -> Compose f g a -> a #

toList :: Compose f g a -> [a] #

null :: Compose f g a -> Bool #

length :: Compose f g a -> Int #

elem :: Eq a => a -> Compose f g a -> Bool #

maximum :: Ord a => Compose f g a -> a #

minimum :: Ord a => Compose f g a -> a #

sum :: Num a => Compose f g a -> a #

product :: Num a => Compose f g a -> a #

(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 #

(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) #

(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] #

(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 #

(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 #

(Zip f, Zip g) => Zip (Compose f g) 
Instance details

Defined in Data.ChunkedZip

Methods

zipWith :: (a -> b -> c) -> Compose f g a -> Compose f g b -> Compose f g c #

zip :: Compose f g a -> Compose f g b -> Compose f g (a, b) #

zap :: Compose f g (a -> b) -> Compose f g a -> Compose f g b #

unzip :: Compose f g (a, b) -> (Compose f g a, Compose f g b) #

(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 -> () #

(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 #

(FoldableWithKey f, FoldableWithKey m) => FoldableWithKey (Compose f m) 
Instance details

Defined in Data.Key

Methods

toKeyedList :: Compose f m a -> [(Key (Compose f m), a)] #

foldMapWithKey :: Monoid m0 => (Key (Compose f m) -> a -> m0) -> Compose f m a -> m0 #

foldrWithKey :: (Key (Compose f m) -> a -> b -> b) -> b -> Compose f m a -> b #

foldlWithKey :: (b -> Key (Compose f m) -> a -> b) -> b -> Compose f m a -> b #

(FoldableWithKey1 f, FoldableWithKey1 m) => FoldableWithKey1 (Compose f m) 
Instance details

Defined in Data.Key

Methods

foldMapWithKey1 :: Semigroup m0 => (Key (Compose f m) -> a -> m0) -> Compose f m a -> m0 #

(Indexable f, Indexable g) => Indexable (Compose f g) 
Instance details

Defined in Data.Key

Methods

index :: Compose f g a -> Key (Compose f g) -> a #

(Keyed f, Keyed g) => Keyed (Compose f g) 
Instance details

Defined in Data.Key

Methods

mapWithKey :: (Key (Compose f g) -> a -> b) -> Compose f g a -> Compose f g b #

(Lookup f, Lookup g) => Lookup (Compose f g) 
Instance details

Defined in Data.Key

Methods

lookup :: Key (Compose f g) -> Compose f g a -> Maybe a #

(TraversableWithKey f, TraversableWithKey m) => TraversableWithKey (Compose f m) 
Instance details

Defined in Data.Key

Methods

traverseWithKey :: Applicative f0 => (Key (Compose f m) -> a -> f0 b) -> Compose f m a -> f0 (Compose f m b) #

mapWithKeyM :: Monad m0 => (Key (Compose f m) -> a -> m0 b) -> Compose f m a -> m0 (Compose f m b) #

(TraversableWithKey1 f, TraversableWithKey1 m) => TraversableWithKey1 (Compose f m) 
Instance details

Defined in Data.Key

Methods

traverseWithKey1 :: Apply f0 => (Key (Compose f m) -> a -> f0 b) -> Compose f m a -> f0 (Compose f m b) #

(Zip f, Zip g) => Zip (Compose f g) 
Instance details

Defined in Data.Key

Methods

zipWith :: (a -> b -> c) -> Compose f g a -> Compose f g b -> Compose f g c #

zip :: Compose f g a -> Compose f g b -> Compose f g (a, b) #

zap :: Compose f g (a -> b) -> Compose f g a -> Compose f g b #

(ZipWithKey f, ZipWithKey g) => ZipWithKey (Compose f g) 
Instance details

Defined in Data.Key

Methods

zipWithKey :: (Key (Compose f g) -> a -> b -> c) -> Compose f g a -> Compose f g b -> Compose f g c #

zapWithKey :: Compose f g (Key (Compose f g) -> a -> b) -> Compose f g a -> Compose f g b #

(Identical f, Identical g) => Identical (Compose f g) 
Instance details

Defined in Lens.Family.Identical

Methods

extract :: Compose f g a -> a

(Apply f, Apply g) => Apply (Compose f g) 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(<.>) :: Compose f g (a -> b) -> Compose f g a -> Compose f g b #

(.>) :: Compose f g a -> Compose f g b -> Compose f g b #

(<.) :: Compose f g a -> Compose f g b -> Compose f g a #

liftF2 :: (a -> b -> c) -> Compose f g a -> Compose f g b -> Compose f g c #

(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] #

(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 #

(Typeable a, Typeable f, Typeable g, Typeable k1, Typeable k2, Data (f (g a))) => Data (Compose f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g0. g0 -> c g0) -> Compose f g a -> c (Compose f g a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Compose f g a) #

toConstr :: Compose f g a -> Constr #

dataTypeOf :: Compose f g a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Compose f g a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Compose f g a)) #

gmapT :: (forall b. Data b => b -> b) -> Compose f g a -> Compose f g a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Compose f g a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Compose f g a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Compose f g a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Compose f g a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Compose f g a -> m (Compose f g a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Compose f g a -> m (Compose f g a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Compose f g a -> m (Compose f g a) #

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 #

(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 #

(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 -> () #

(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 #

(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 #

(Hashable1 f, Hashable1 g, Hashable a) => Hashable (Compose f g a)

In general, hash (Compose x) ≠ hash x. However, hashWithSalt satisfies its variant of this equivalence.

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Compose f g a -> Int #

hash :: Compose f g a -> Int #

(Foldable f, Foldable g) => MonoFoldable (Compose f g a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (Compose f g a) -> m) -> Compose f g a -> m #

ofoldr :: (Element (Compose f g a) -> b -> b) -> b -> Compose f g a -> b #

ofoldl' :: (a0 -> Element (Compose f g a) -> a0) -> a0 -> Compose f g a -> a0 #

otoList :: Compose f g a -> [Element (Compose f g a)] #

oall :: (Element (Compose f g a) -> Bool) -> Compose f g a -> Bool #

oany :: (Element (Compose f g a) -> Bool) -> Compose f g a -> Bool #

onull :: Compose f g a -> Bool #

olength :: Compose f g a -> Int #

olength64 :: Compose f g a -> Int64 #

ocompareLength :: Integral i => Compose f g a -> i -> Ordering #

otraverse_ :: Applicative f0 => (Element (Compose f g a) -> f0 b) -> Compose f g a -> f0 () #

ofor_ :: Applicative f0 => Compose f g a -> (Element (Compose f g a) -> f0 b) -> f0 () #

omapM_ :: Applicative m => (Element (Compose f g a) -> m ()) -> Compose f g a -> m () #

oforM_ :: Applicative m => Compose f g a -> (Element (Compose f g a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (Compose f g a) -> m a0) -> a0 -> Compose f g a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (Compose f g a) -> m) -> Compose f g a -> m #

ofoldr1Ex :: (Element (Compose f g a) -> Element (Compose f g a) -> Element (Compose f g a)) -> Compose f g a -> Element (Compose f g a) #

ofoldl1Ex' :: (Element (Compose f g a) -> Element (Compose f g a) -> Element (Compose f g a)) -> Compose f g a -> Element (Compose f g a) #

headEx :: Compose f g a -> Element (Compose f g a) #

lastEx :: Compose f g a -> Element (Compose f g a) #

unsafeHead :: Compose f g a -> Element (Compose f g a) #

unsafeLast :: Compose f g a -> Element (Compose f g a) #

maximumByEx :: (Element (Compose f g a) -> Element (Compose f g a) -> Ordering) -> Compose f g a -> Element (Compose f g a) #

minimumByEx :: (Element (Compose f g a) -> Element (Compose f g a) -> Ordering) -> Compose f g a -> Element (Compose f g a) #

oelem :: Element (Compose f g a) -> Compose f g a -> Bool #

onotElem :: Element (Compose f g a) -> Compose f g a -> Bool #

(Functor f, Functor g) => MonoFunctor (Compose f g a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Compose f g a) -> Element (Compose f g a)) -> Compose f g a -> Compose f g a #

(Applicative f, Applicative g) => MonoPointed (Compose f g a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Compose f g a) -> Compose f g a #

(Traversable f, Traversable g) => MonoTraversable (Compose f g a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f0 => (Element (Compose f g a) -> f0 (Element (Compose f g a))) -> Compose f g a -> f0 (Compose f g a) #

omapM :: Applicative m => (Element (Compose f g a) -> m (Element (Compose f g a))) -> Compose f g a -> m (Compose f g a) #

Unbox (f (g a)) => Unbox (Compose f g a) 
Instance details

Defined in Data.Vector.Unboxed.Base

(Cosieve p f, Cosieve q g) => Cosieve (Procompose p q) (Compose f g) 
Instance details

Defined in Data.Profunctor.Composition

Methods

cosieve :: Procompose p q a b -> Compose f g a -> b #

(Sieve p f, Sieve q g) => Sieve (Procompose p q) (Compose g f) 
Instance details

Defined in Data.Profunctor.Composition

Methods

sieve :: Procompose p q a b -> a -> Compose g f b #

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) 
Instance details

Defined in Data.Functor.Rep

type Rep (Compose f g) = (Rep f, Rep g)
type Key (Compose f g) 
Instance details

Defined in Data.Key

type Key (Compose f g) = (Key f, Key g)
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)))))
type Element (Compose f g a) 
Instance details

Defined in Data.MonoTraversable

type Element (Compose f g a) = 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)))

data Void #

Uninhabited data type

Since: base-4.8.0.0

Instances

Instances details
FromJSON Void 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Void 
Instance details

Defined in Data.Aeson.Types.ToJSON

Data Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Void -> c Void #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Void #

toConstr :: Void -> Constr #

dataTypeOf :: Void -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Void) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Void) #

gmapT :: (forall b. Data b => b -> b) -> Void -> Void #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Void -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Void -> r #

gmapQ :: (forall d. Data d => d -> u) -> Void -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Void -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Void -> m Void #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Void -> m Void #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Void -> m Void #

Semigroup Void

Since: base-4.9.0.0

Instance details

Defined in Data.Void

Methods

(<>) :: Void -> Void -> Void #

sconcat :: NonEmpty Void -> Void #

stimes :: Integral b => b -> Void -> Void #

Exception Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Generic Void 
Instance details

Defined in Data.Void

Associated Types

type Rep Void :: Type -> Type #

Methods

from :: Void -> Rep Void x #

to :: Rep Void x -> Void #

Ix Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Methods

range :: (Void, Void) -> [Void] #

index :: (Void, Void) -> Void -> Int #

unsafeIndex :: (Void, Void) -> Void -> Int #

inRange :: (Void, Void) -> Void -> Bool #

rangeSize :: (Void, Void) -> Int #

unsafeRangeSize :: (Void, Void) -> Int #

Read Void

Reading a Void value is always a parse error, considering Void as a data type with no constructors.

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Show Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Methods

showsPrec :: Int -> Void -> ShowS #

show :: Void -> String #

showList :: [Void] -> ShowS #

NFData Void

Defined as rnf = absurd.

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Void -> () #

Eq Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Methods

(==) :: Void -> Void -> Bool #

(/=) :: Void -> Void -> Bool #

Ord Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Methods

compare :: Void -> Void -> Ordering #

(<) :: Void -> Void -> Bool #

(<=) :: Void -> Void -> Bool #

(>) :: Void -> Void -> Bool #

(>=) :: Void -> Void -> Bool #

max :: Void -> Void -> Void #

min :: Void -> Void -> Void #

Hashable Void 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Void -> Int #

hash :: Void -> Int #

FromHttpApiData Void

Parsing a Void value is always an error, considering Void as a data type with no constructors.

Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Void 
Instance details

Defined in Web.Internal.HttpApiData

Pretty Void

Finding a good example for printing something that does not exist is hard, so here is an example of printing a list full of nothing.

>>> pretty ([] :: [Void])
[]
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Void -> Doc ann #

prettyList :: [Void] -> Doc ann #

ToContent Void 
Instance details

Defined in Yesod.Core.Content

Methods

toContent :: Void -> Content #

ToTypedContent Void 
Instance details

Defined in Yesod.Core.Content

Lift Void

Since: template-haskell-2.15.0.0

Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Void -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Void -> Code m Void #

type Rep Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

type Rep Void = D1 ('MetaData "Void" "Data.Void" "base" 'False) (V1 :: Type -> Type)

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. It is implemented in terms of fmap absurd.

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 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

Instances details
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 #

NFData1 WrappedMonoid

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> WrappedMonoid a -> () #

Hashable1 WrappedMonoid

Since: hashable-1.3.1.0

Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> WrappedMonoid a -> Int #

Unbox a => Vector Vector (WrappedMonoid a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox a => MVector MVector (WrappedMonoid a) 
Instance details

Defined in Data.Vector.Unboxed.Base

FromJSON a => FromJSON (WrappedMonoid a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON a => ToJSON (WrappedMonoid a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Data m => Data (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> WrappedMonoid m -> c (WrappedMonoid m) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (WrappedMonoid m) #

toConstr :: WrappedMonoid m -> Constr #

dataTypeOf :: WrappedMonoid m -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (WrappedMonoid m)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (WrappedMonoid m)) #

gmapT :: (forall b. Data b => b -> b) -> WrappedMonoid m -> WrappedMonoid m #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WrappedMonoid m -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WrappedMonoid m -> r #

gmapQ :: (forall d. Data d => d -> u) -> WrappedMonoid m -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> WrappedMonoid m -> u #

gmapM :: Monad m0 => (forall d. Data d => d -> m0 d) -> WrappedMonoid m -> m0 (WrappedMonoid m) #

gmapMp :: MonadPlus m0 => (forall d. Data d => d -> m0 d) -> WrappedMonoid m -> m0 (WrappedMonoid m) #

gmapMo :: MonadPlus m0 => (forall d. Data d => d -> m0 d) -> WrappedMonoid m -> m0 (WrappedMonoid m) #

Monoid m => Monoid (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Monoid m => Semigroup (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

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

Generic (WrappedMonoid m) 
Instance details

Defined in Data.Semigroup

Associated Types

type Rep (WrappedMonoid m) :: Type -> Type #

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

NFData m => NFData (WrappedMonoid m)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: WrappedMonoid m -> () #

Eq m => Eq (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Ord m => Ord (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Hashable a => Hashable (WrappedMonoid a) 
Instance details

Defined in Data.Hashable.Class

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 #

Methods

from1 :: forall (a :: k). WrappedMonoid a -> Rep1 WrappedMonoid a #

to1 :: forall (a :: k). Rep1 WrappedMonoid a -> WrappedMonoid a #

newtype MVector s (WrappedMonoid a) 
Instance details

Defined in Data.Vector.Unboxed.Base

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

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.

Constructors

Option 

Fields

Instances

Instances details
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 #

MonadFix Option

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

mfix :: (a -> Option a) -> 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 #

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] #

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 #

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 #

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 #

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 -> () #

Hashable1 Option

Since: hashable-1.3.1.0

Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> Option a -> Int #

Apply Option 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(<.>) :: Option (a -> b) -> Option a -> Option b #

(.>) :: Option a -> Option b -> Option b #

(<.) :: Option a -> Option b -> Option a #

liftF2 :: (a -> b -> c) -> Option a -> Option b -> Option c #

Bind Option 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(>>-) :: Option a -> (a -> Option b) -> Option b #

join :: Option (Option a) -> Option 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 (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)

FromJSON a => FromJSON (Option a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON a => ToJSON (Option a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

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 :: forall r r'. (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) #

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 #

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 #

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 #

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 #

NFData a => NFData (Option a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Option a -> () #

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 #

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 #

Hashable a => Hashable (Option a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Option a -> Int #

hash :: Option a -> Int #

MonoFoldable (Option a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (Option a) -> m) -> Option a -> m #

ofoldr :: (Element (Option a) -> b -> b) -> b -> Option a -> b #

ofoldl' :: (a0 -> Element (Option a) -> a0) -> a0 -> Option a -> a0 #

otoList :: Option a -> [Element (Option a)] #

oall :: (Element (Option a) -> Bool) -> Option a -> Bool #

oany :: (Element (Option a) -> Bool) -> Option a -> Bool #

onull :: Option a -> Bool #

olength :: Option a -> Int #

olength64 :: Option a -> Int64 #

ocompareLength :: Integral i => Option a -> i -> Ordering #

otraverse_ :: Applicative f => (Element (Option a) -> f b) -> Option a -> f () #

ofor_ :: Applicative f => Option a -> (Element (Option a) -> f b) -> f () #

omapM_ :: Applicative m => (Element (Option a) -> m ()) -> Option a -> m () #

oforM_ :: Applicative m => Option a -> (Element (Option a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (Option a) -> m a0) -> a0 -> Option a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (Option a) -> m) -> Option a -> m #

ofoldr1Ex :: (Element (Option a) -> Element (Option a) -> Element (Option a)) -> Option a -> Element (Option a) #

ofoldl1Ex' :: (Element (Option a) -> Element (Option a) -> Element (Option a)) -> Option a -> Element (Option a) #

headEx :: Option a -> Element (Option a) #

lastEx :: Option a -> Element (Option a) #

unsafeHead :: Option a -> Element (Option a) #

unsafeLast :: Option a -> Element (Option a) #

maximumByEx :: (Element (Option a) -> Element (Option a) -> Ordering) -> Option a -> Element (Option a) #

minimumByEx :: (Element (Option a) -> Element (Option a) -> Ordering) -> Option a -> Element (Option a) #

oelem :: Element (Option a) -> Option a -> Bool #

onotElem :: Element (Option a) -> Option a -> Bool #

MonoFunctor (Option a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Option a) -> Element (Option a)) -> Option a -> Option a #

MonoPointed (Option a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Option a) -> Option a #

MonoTraversable (Option a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (Option a) -> f (Element (Option a))) -> Option a -> f (Option a) #

omapM :: Applicative m => (Element (Option a) -> m (Element (Option a))) -> Option a -> m (Option a) #

Generic1 Option 
Instance details

Defined in Data.Semigroup

Associated Types

type Rep1 Option :: k -> Type #

Methods

from1 :: forall (a :: k). Option a -> Rep1 Option a #

to1 :: forall (a :: k). 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 Element (Option a) 
Instance details

Defined in Data.MonoTraversable

type Element (Option a) = 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)))

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.

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

tail :: NonEmpty a -> [a] #

Extract the possibly-empty tail 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.

last :: NonEmpty a -> a #

Extract the last element of the stream.

init :: NonEmpty a -> [a] #

Extract everything except the last element of the stream.

head :: NonEmpty a -> a #

Extract the first element of the stream.

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. This allows us to run IO computations in any monadic stack, so long as it supports these kinds of operations (i.e. IO is the base monad for the stack).

Example

Expand
import Control.Monad.Trans.State -- from the "transformers" library

printState :: Show s => StateT s IO ()
printState = do
  state <- get
  liftIO $ print state

Had we omitted liftIO, we would have ended up with this error:

• Couldn't match type ‘IO’ with ‘StateT s IO’
 Expected type: StateT s IO ()
   Actual type: IO ()

The important part here is the mismatch between StateT s IO () and IO ().

Luckily, we know of a function that takes an IO a and returns an (m a): liftIO, enabling us to run the program and see the expected results:

> evalStateT printState "hello"
"hello"

> evalStateT printState 3
3

Instances

Instances details
MonadIO IO

Since: base-4.9.0.0

Instance details

Defined in Control.Monad.IO.Class

Methods

liftIO :: IO a -> IO a #

MonadIO Acquire 
Instance details

Defined in Data.Acquire.Internal

Methods

liftIO :: IO a -> Acquire a #

MonadIO Q 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

liftIO :: IO a -> Q a #

MonadIO m => MonadIO (AppM m) Source # 
Instance details

Defined in BtcLsp.Data.AppM

Methods

liftIO :: IO a -> AppM m a #

MonadIO m => MonadIO (CatchT m) 
Instance details

Defined in Control.Monad.Catch.Pure

Methods

liftIO :: IO a -> CatchT 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 (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 (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

liftIO :: IO a -> ResourceT m 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 (HandlerFor site) 
Instance details

Defined in Yesod.Core.Types

Methods

liftIO :: IO a -> HandlerFor site a #

MonadIO (WidgetFor site) 
Instance details

Defined in Yesod.Core.Types

Methods

liftIO :: IO a -> WidgetFor site a #

MonadIO m => MonadIO (ExceptRT r m) 
Instance details

Defined in Data.EitherR

Methods

liftIO :: IO a -> ExceptRT r m a #

(Functor f, MonadIO m) => MonadIO (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

liftIO :: IO a -> FreeT f m a #

(Monoid w, Functor m, MonadIO m) => MonadIO (AccumT w m) 
Instance details

Defined in Control.Monad.Trans.Accum

Methods

liftIO :: IO a -> AccumT w m a #

(Error e, MonadIO m) => MonadIO (ErrorT e m) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

liftIO :: IO a -> ErrorT e m a #

MonadIO m => MonadIO (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

liftIO :: IO a -> ExceptT e m a #

MonadIO m => MonadIO (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

liftIO :: IO a -> IdentityT m a #

MonadIO m => MonadIO (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

liftIO :: IO a -> ReaderT r m a #

MonadIO m => MonadIO (SelectT r m) 
Instance details

Defined in Control.Monad.Trans.Select

Methods

liftIO :: IO a -> SelectT r m a #

MonadIO m => MonadIO (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Lazy

Methods

liftIO :: IO a -> StateT s m a #

MonadIO m => MonadIO (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

liftIO :: IO a -> StateT s m a #

MonadIO m => MonadIO (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.CPS

Methods

liftIO :: IO a -> WriterT w m a #

(Monoid w, MonadIO m) => MonadIO (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

liftIO :: IO a -> WriterT w m a #

(Monoid w, MonadIO m) => MonadIO (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

liftIO :: IO a -> WriterT w m a #

MonadIO (SubHandlerFor child master) 
Instance details

Defined in Yesod.Core.Types

Methods

liftIO :: IO a -> SubHandlerFor child master a #

MonadIO m => MonadIO (ConduitT i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

liftIO :: IO a -> ConduitT i o m a #

MonadIO m => MonadIO (ContT r m) 
Instance details

Defined in Control.Monad.Trans.Cont

Methods

liftIO :: IO a -> ContT r m a #

MonadIO m => MonadIO (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.CPS

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.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 #

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.

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 act n times, and then returns the list of results:

Examples

Expand
>>> replicateM 3 (putStrLn "a")
a
a
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

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 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

Note that "forever" isn't necessarily non-terminating. If the action is in a MonadPlus and short-circuits after some number of iterations. then forever actually returns mzero, effectively short-circuiting its caller.

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

filterM :: Applicative m => (a -> m Bool) -> [a] -> m [a] #

This generalizes the list-based filter function.

(>=>) :: Monad m => (a -> m b) -> (b -> m c) -> a -> m c infixr 1 #

Left-to-right composition of Kleisli arrows.

'(bs >=> cs) a' can be understood as the do expression

do b <- bs a
   cs b

(<=<) :: 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 -> b) -> m a -> m b infixl 4 #

Strict version of <$>.

Since: base-4.8.0.0

mapAccumR :: Traversable t => (s -> a -> (s, b)) -> s -> t a -> (s, t b) #

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.

Examples

Expand

Basic usage:

>>> mapAccumR (\a b -> (a + b, a)) 0 [1..10]
(55,[54,52,49,45,40,34,27,19,10,0])
>>> mapAccumR (\a b -> (a <> show b, a)) "0" [1..5]
("054321",["05432","0543","054","05","0"])

mapAccumL :: Traversable t => (s -> a -> (s, b)) -> s -> t a -> (s, t b) #

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.

Examples

Expand

Basic usage:

>>> mapAccumL (\a b -> (a + b, a)) 0 [1..10]
(55,[0,1,3,6,10,15,21,28,36,45])
>>> mapAccumL (\a b -> (a <> show b, a)) "0" [1..5]
("012345",["0","01","012","0123","01234"])

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_.

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)

newtype ZipList a #

Lists, but with an Applicative functor based on zipping.

Constructors

ZipList 

Fields

Instances

Instances details
Foldable ZipList

Since: base-4.9.0.0

Instance details

Defined in Control.Applicative

Methods

fold :: Monoid m => ZipList m -> m #

foldMap :: Monoid m => (a -> m) -> ZipList a -> m #

foldMap' :: Monoid m => (a -> m) -> ZipList a -> m #

foldr :: (a -> b -> b) -> b -> ZipList a -> b #

foldr' :: (a -> b -> b) -> b -> ZipList a -> b #

foldl :: (b -> a -> b) -> b -> ZipList a -> b #

foldl' :: (b -> a -> b) -> b -> ZipList a -> b #

foldr1 :: (a -> a -> a) -> ZipList a -> a #

foldl1 :: (a -> a -> a) -> ZipList a -> a #

toList :: ZipList a -> [a] #

null :: ZipList a -> Bool #

length :: ZipList a -> Int #

elem :: Eq a => a -> ZipList a -> Bool #

maximum :: Ord a => ZipList a -> a #

minimum :: Ord a => ZipList a -> a #

sum :: Num a => ZipList a -> a #

product :: Num a => ZipList a -> a #

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] #

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 #

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 #

NFData1 ZipList

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> ZipList a -> () #

Adjustable ZipList 
Instance details

Defined in Data.Key

Methods

adjust :: (a -> a) -> Key ZipList -> ZipList a -> ZipList a #

replace :: Key ZipList -> a -> ZipList a -> ZipList a #

FoldableWithKey ZipList 
Instance details

Defined in Data.Key

Methods

toKeyedList :: ZipList a -> [(Key ZipList, a)] #

foldMapWithKey :: Monoid m => (Key ZipList -> a -> m) -> ZipList a -> m #

foldrWithKey :: (Key ZipList -> a -> b -> b) -> b -> ZipList a -> b #

foldlWithKey :: (b -> Key ZipList -> a -> b) -> b -> ZipList a -> b #

Indexable ZipList 
Instance details

Defined in Data.Key

Methods

index :: ZipList a -> Key ZipList -> a #

Keyed ZipList 
Instance details

Defined in Data.Key

Methods

mapWithKey :: (Key ZipList -> a -> b) -> ZipList a -> ZipList b #

Lookup ZipList 
Instance details

Defined in Data.Key

Methods

lookup :: Key ZipList -> ZipList a -> Maybe a #

TraversableWithKey ZipList 
Instance details

Defined in Data.Key

Methods

traverseWithKey :: Applicative f => (Key ZipList -> a -> f b) -> ZipList a -> f (ZipList b) #

mapWithKeyM :: Monad m => (Key ZipList -> a -> m b) -> ZipList a -> m (ZipList b) #

Zip ZipList 
Instance details

Defined in Data.Key

Methods

zipWith :: (a -> b -> c) -> ZipList a -> ZipList b -> ZipList c #

zip :: ZipList a -> ZipList b -> ZipList (a, b) #

zap :: ZipList (a -> b) -> ZipList a -> ZipList b #

ZipWithKey ZipList 
Instance details

Defined in Data.Key

Methods

zipWithKey :: (Key ZipList -> a -> b -> c) -> ZipList a -> ZipList b -> ZipList c #

zapWithKey :: ZipList (Key ZipList -> a -> b) -> ZipList a -> ZipList b #

Apply ZipList 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(<.>) :: ZipList (a -> b) -> ZipList a -> ZipList b #

(.>) :: ZipList a -> ZipList b -> ZipList b #

(<.) :: ZipList a -> ZipList b -> ZipList a #

liftF2 :: (a -> b -> c) -> ZipList a -> ZipList b -> ZipList c #

IsList (ZipList a)

Since: base-4.15.0.0

Instance details

Defined in GHC.Exts

Associated Types

type Item (ZipList a) #

Methods

fromList :: [Item (ZipList a)] -> ZipList a #

fromListN :: Int -> [Item (ZipList a)] -> ZipList a #

toList :: ZipList a -> [Item (ZipList 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 #

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 #

NFData a => NFData (ZipList a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: 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 #

MonoFunctor (ZipList a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (ZipList a) -> Element (ZipList a)) -> ZipList a -> ZipList a #

MonoPointed (ZipList a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (ZipList a) -> ZipList a #

Container (ZipList a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (ZipList a) #

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 #

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 #

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)) #

safeMaximum :: ZipList a -> Maybe (Element (ZipList a)) #

safeMinimum :: ZipList a -> Maybe (Element (ZipList a)) #

safeFoldr1 :: (Element (ZipList a) -> Element (ZipList a) -> Element (ZipList a)) -> ZipList a -> Maybe (Element (ZipList a)) #

safeFoldl1 :: (Element (ZipList a) -> Element (ZipList a) -> Element (ZipList a)) -> ZipList a -> Maybe (Element (ZipList a)) #

FromList (ZipList a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type ListElement (ZipList a) #

type FromListC (ZipList a) #

Methods

fromList :: [ListElement (ZipList a)] -> ZipList a #

Generic1 ZipList 
Instance details

Defined in Control.Applicative

Associated Types

type Rep1 ZipList :: k -> Type #

Methods

from1 :: forall (a :: k). ZipList a -> Rep1 ZipList a #

to1 :: forall (a :: k). Rep1 ZipList a -> ZipList a #

type Key ZipList 
Instance details

Defined in Data.Key

type Key ZipList = Int
type Item (ZipList a) 
Instance details

Defined in GHC.Exts

type Item (ZipList a) = 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 Element (ZipList a) 
Instance details

Defined in Data.MonoTraversable

type Element (ZipList a) = a
type Element (ZipList a) 
Instance details

Defined in Universum.Container.Class

type Element (ZipList a) = ElementDefault (ZipList a)
type FromListC (ZipList a) 
Instance details

Defined in Universum.Container.Class

type FromListC (ZipList a) = ()
type ListElement (ZipList a) 
Instance details

Defined in Universum.Container.Class

type ListElement (ZipList a) = 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 [])))

optional :: Alternative f => f a -> f (Maybe a) #

One or none.

It is useful for modelling any computation that is allowed to fail.

Examples

Expand

Using the Alternative instance of Except, the following functions:

>>> canFail = throwError "it failed" :: Except String Int
>>> final = return 42                :: Except String Int

Can be combined by allowing the first function to fail:

>>> runExcept $ canFail *> final
Left "it failed"
>>> runExcept $ optional canFail *> final
Right 42

(&&&) :: 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

Instances details
Representable Identity 
Instance details

Defined in Data.Functor.Rep

Associated Types

type Rep Identity #

Methods

tabulate :: (Rep Identity -> a) -> Identity a #

index :: Identity a -> Rep Identity -> a #

FromJSON1 Identity 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (Identity a) #

liftParseJSONList :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [Identity a] #

ToJSON1 Identity 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Value) -> ([a] -> Value) -> Identity a -> Value #

liftToJSONList :: (a -> Value) -> ([a] -> Value) -> [Identity a] -> Value #

liftToEncoding :: (a -> Encoding) -> ([a] -> Encoding) -> Identity a -> Encoding #

liftToEncodingList :: (a -> Encoding) -> ([a] -> Encoding) -> [Identity a] -> Encoding #

MonadFix Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

mfix :: (a -> Identity a) -> Identity a #

Foldable Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

fold :: Monoid m => Identity m -> m #

foldMap :: Monoid m => (a -> m) -> Identity a -> m #

foldMap' :: Monoid m => (a -> m) -> Identity a -> m #

foldr :: (a -> b -> b) -> b -> Identity a -> b #

foldr' :: (a -> b -> b) -> b -> Identity a -> b #

foldl :: (b -> a -> b) -> b -> Identity a -> b #

foldl' :: (b -> a -> b) -> b -> Identity a -> b #

foldr1 :: (a -> a -> a) -> Identity a -> a #

foldl1 :: (a -> a -> a) -> Identity a -> a #

toList :: Identity a -> [a] #

null :: Identity a -> Bool #

length :: Identity a -> Int #

elem :: Eq a => a -> Identity a -> Bool #

maximum :: Ord a => Identity a -> a #

minimum :: Ord a => Identity a -> a #

sum :: Num a => Identity a -> a #

product :: Num a => Identity a -> a #

Eq1 Identity

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftEq :: (a -> b -> Bool) -> Identity a -> Identity b -> Bool #

Ord1 Identity

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftCompare :: (a -> b -> Ordering) -> Identity a -> Identity b -> Ordering #

Read1 Identity

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (Identity a) #

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [Identity a] #

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (Identity a) #

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [Identity a] #

Show1 Identity

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Identity a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Identity a] -> ShowS #

Traversable Identity

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Identity a -> f (Identity b) #

sequenceA :: Applicative f => Identity (f a) -> f (Identity a) #

mapM :: Monad m => (a -> m b) -> Identity a -> m (Identity b) #

sequence :: Monad m => Identity (m a) -> m (Identity a) #

Applicative Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

pure :: a -> Identity a #

(<*>) :: Identity (a -> b) -> Identity a -> Identity b #

liftA2 :: (a -> b -> c) -> Identity a -> Identity b -> Identity c #

(*>) :: Identity a -> Identity b -> Identity b #

(<*) :: Identity a -> Identity b -> Identity a #

Functor Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

fmap :: (a -> b) -> Identity a -> Identity b #

(<$) :: a -> Identity b -> Identity a #

Monad Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

(>>=) :: Identity a -> (a -> Identity b) -> Identity b #

(>>) :: Identity a -> Identity b -> Identity b #

return :: a -> Identity a #

Comonad Identity 
Instance details

Defined in Control.Comonad

Methods

extract :: Identity a -> a #

duplicate :: Identity a -> Identity (Identity a) #

extend :: (Identity a -> b) -> Identity a -> Identity b #

ComonadApply Identity 
Instance details

Defined in Control.Comonad

Methods

(<@>) :: Identity (a -> b) -> Identity a -> Identity b #

(@>) :: Identity a -> Identity b -> Identity b #

(<@) :: Identity a -> Identity b -> Identity a #

NFData1 Identity

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> Identity a -> () #

Hashable1 Identity 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> Identity a -> Int #

Adjustable Identity 
Instance details

Defined in Data.Key

Methods

adjust :: (a -> a) -> Key Identity -> Identity a -> Identity a #

replace :: Key Identity -> a -> Identity a -> Identity a #

FoldableWithKey Identity 
Instance details

Defined in Data.Key

Methods

toKeyedList :: Identity a -> [(Key Identity, a)] #

foldMapWithKey :: Monoid m => (Key Identity -> a -> m) -> Identity a -> m #

foldrWithKey :: (Key Identity -> a -> b -> b) -> b -> Identity a -> b #

foldlWithKey :: (b -> Key Identity -> a -> b) -> b -> Identity a -> b #

FoldableWithKey1 Identity 
Instance details

Defined in Data.Key

Methods

foldMapWithKey1 :: Semigroup m => (Key Identity -> a -> m) -> Identity a -> m #

Indexable Identity 
Instance details

Defined in Data.Key

Methods

index :: Identity a -> Key Identity -> a #

Keyed Identity 
Instance details

Defined in Data.Key

Methods

mapWithKey :: (Key Identity -> a -> b) -> Identity a -> Identity b #

Lookup Identity 
Instance details

Defined in Data.Key

Methods

lookup :: Key Identity -> Identity a -> Maybe a #

TraversableWithKey Identity 
Instance details

Defined in Data.Key

Methods

traverseWithKey :: Applicative f => (Key Identity -> a -> f b) -> Identity a -> f (Identity b) #

mapWithKeyM :: Monad m => (Key Identity -> a -> m b) -> Identity a -> m (Identity b) #

TraversableWithKey1 Identity 
Instance details

Defined in Data.Key

Methods

traverseWithKey1 :: Apply f => (Key Identity -> a -> f b) -> Identity a -> f (Identity b) #

Zip Identity 
Instance details

Defined in Data.Key

Methods

zipWith :: (a -> b -> c) -> Identity a -> Identity b -> Identity c #

zip :: Identity a -> Identity b -> Identity (a, b) #

zap :: Identity (a -> b) -> Identity a -> Identity b #

ZipWithKey Identity 
Instance details

Defined in Data.Key

Methods

zipWithKey :: (Key Identity -> a -> b -> c) -> Identity a -> Identity b -> Identity c #

zapWithKey :: Identity (Key Identity -> a -> b) -> Identity a -> Identity b #

Identical Identity 
Instance details

Defined in Lens.Family.Identical

Methods

extract :: Identity a -> a

Apply Identity 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(<.>) :: Identity (a -> b) -> Identity a -> Identity b #

(.>) :: Identity a -> Identity b -> Identity b #

(<.) :: Identity a -> Identity b -> Identity a #

liftF2 :: (a -> b -> c) -> Identity a -> Identity b -> Identity c #

Bind Identity 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(>>-) :: Identity a -> (a -> Identity b) -> Identity b #

join :: Identity (Identity a) -> Identity a #

MonadBaseControl Identity Identity 
Instance details

Defined in Control.Monad.Trans.Control

Associated Types

type StM Identity a #

Unbox a => Vector Vector (Identity a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox a => MVector MVector (Identity a) 
Instance details

Defined in Data.Vector.Unboxed.Base

FromJSON a => FromJSON (Identity a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey a => FromJSONKey (Identity a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON a => ToJSON (Identity a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey a => ToJSONKey (Identity a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

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

IsString a => IsString (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.String

Methods

fromString :: String -> Identity a #

Storable a => Storable (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

sizeOf :: Identity a -> Int #

alignment :: Identity a -> Int #

peekElemOff :: Ptr (Identity a) -> Int -> IO (Identity a) #

pokeElemOff :: Ptr (Identity a) -> Int -> Identity a -> IO () #

peekByteOff :: Ptr b -> Int -> IO (Identity a) #

pokeByteOff :: Ptr b -> Int -> Identity a -> IO () #

peek :: Ptr (Identity a) -> IO (Identity a) #

poke :: Ptr (Identity a) -> Identity a -> IO () #

Monoid a => Monoid (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

mempty :: Identity a #

mappend :: Identity a -> Identity a -> Identity a #

mconcat :: [Identity a] -> Identity a #

Semigroup a => Semigroup (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

(<>) :: Identity a -> Identity a -> Identity a #

sconcat :: NonEmpty (Identity a) -> Identity a #

stimes :: Integral b => b -> Identity a -> Identity a #

Bounded a => Bounded (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Enum a => Enum (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Floating a => Floating (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

RealFloat a => RealFloat (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Generic (Identity a) 
Instance details

Defined in Data.Functor.Identity

Associated Types

type Rep (Identity a) :: Type -> Type #

Methods

from :: Identity a -> Rep (Identity a) x #

to :: Rep (Identity a) x -> Identity a #

Ix a => Ix (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Num a => Num (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Read a => Read (Identity a)

This instance would be equivalent to the derived instances of the Identity newtype if the runIdentity field were removed

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Fractional a => Fractional (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Integral a => Integral (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Real a => Real (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

toRational :: Identity a -> Rational #

RealFrac a => RealFrac (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

properFraction :: Integral b => Identity a -> (b, Identity a) #

truncate :: Integral b => Identity a -> b #

round :: Integral b => Identity a -> b #

ceiling :: Integral b => Identity a -> b #

floor :: Integral b => Identity a -> b #

Show a => Show (Identity a)

This instance would be equivalent to the derived instances of the Identity newtype if the runIdentity field were removed

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

showsPrec :: Int -> Identity a -> ShowS #

show :: Identity a -> String #

showList :: [Identity a] -> ShowS #

NFData a => NFData (Identity a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Identity a -> () #

Eq a => Eq (Identity a)

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

(==) :: Identity a -> Identity a -> Bool #

(/=) :: Identity a -> Identity a -> Bool #

Ord a => Ord (Identity a)

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

compare :: Identity a -> Identity a -> Ordering #

(<) :: Identity a -> Identity a -> Bool #

(<=) :: Identity a -> Identity a -> Bool #

(>) :: Identity a -> Identity a -> Bool #

(>=) :: Identity a -> Identity a -> Bool #

max :: Identity a -> Identity a -> Identity a #

min :: Identity a -> Identity a -> Identity a #

Hashable a => Hashable (Identity a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Identity a -> Int #

hash :: Identity a -> Int #

FromHttpApiData a => FromHttpApiData (Identity a)

Since: http-api-data-0.4.2

Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData a => ToHttpApiData (Identity a)

Since: http-api-data-0.4.2

Instance details

Defined in Web.Internal.HttpApiData

MonoFoldable (Identity a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (Identity a) -> m) -> Identity a -> m #

ofoldr :: (Element (Identity a) -> b -> b) -> b -> Identity a -> b #

ofoldl' :: (a0 -> Element (Identity a) -> a0) -> a0 -> Identity a -> a0 #

otoList :: Identity a -> [Element (Identity a)] #

oall :: (Element (Identity a) -> Bool) -> Identity a -> Bool #

oany :: (Element (Identity a) -> Bool) -> Identity a -> Bool #

onull :: Identity a -> Bool #

olength :: Identity a -> Int #

olength64 :: Identity a -> Int64 #

ocompareLength :: Integral i => Identity a -> i -> Ordering #

otraverse_ :: Applicative f => (Element (Identity a) -> f b) -> Identity a -> f () #

ofor_ :: Applicative f => Identity a -> (Element (Identity a) -> f b) -> f () #

omapM_ :: Applicative m => (Element (Identity a) -> m ()) -> Identity a -> m () #

oforM_ :: Applicative m => Identity a -> (Element (Identity a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (Identity a) -> m a0) -> a0 -> Identity a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (Identity a) -> m) -> Identity a -> m #

ofoldr1Ex :: (Element (Identity a) -> Element (Identity a) -> Element (Identity a)) -> Identity a -> Element (Identity a) #

ofoldl1Ex' :: (Element (Identity a) -> Element (Identity a) -> Element (Identity a)) -> Identity a -> Element (Identity a) #

headEx :: Identity a -> Element (Identity a) #

lastEx :: Identity a -> Element (Identity a) #

unsafeHead :: Identity a -> Element (Identity a) #

unsafeLast :: Identity a -> Element (Identity a) #

maximumByEx :: (Element (Identity a) -> Element (Identity a) -> Ordering) -> Identity a -> Element (Identity a) #

minimumByEx :: (Element (Identity a) -> Element (Identity a) -> Ordering) -> Identity a -> Element (Identity a) #

oelem :: Element (Identity a) -> Identity a -> Bool #

onotElem :: Element (Identity a) -> Identity a -> Bool #

MonoFunctor (Identity a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Identity a) -> Element (Identity a)) -> Identity a -> Identity a #

MonoPointed (Identity a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Identity a) -> Identity a #

MonoTraversable (Identity a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (Identity a) -> f (Element (Identity a))) -> Identity a -> f (Identity a) #

omapM :: Applicative m => (Element (Identity a) -> m (Element (Identity a))) -> Identity a -> m (Identity a) #

Pretty a => Pretty (Identity a)
>>> pretty (Identity 1)
1
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Identity a -> Doc ann #

prettyList :: [Identity a] -> Doc ann #

Prim a => Prim (Identity a)

Since: primitive-0.6.5.0

Instance details

Defined in Data.Primitive.Types

(TypeError (DisallowInstance "Identity") :: Constraint) => Container (Identity a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Identity a) #

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 #

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 #

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)) #

safeMaximum :: Identity a -> Maybe (Element (Identity a)) #

safeMinimum :: Identity a -> Maybe (Element (Identity a)) #

safeFoldr1 :: (Element (Identity a) -> Element (Identity a) -> Element (Identity a)) -> Identity a -> Maybe (Element (Identity a)) #

safeFoldl1 :: (Element (Identity a) -> Element (Identity a) -> Element (Identity a)) -> Identity a -> Maybe (Element (Identity a)) #

Unbox a => Unbox (Identity a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Generic1 Identity 
Instance details

Defined in Data.Functor.Identity

Associated Types

type Rep1 Identity :: k -> Type #

Methods

from1 :: forall (a :: k). Identity a -> Rep1 Identity a #

to1 :: forall (a :: k). Rep1 Identity a -> Identity a #

type Rep Identity 
Instance details

Defined in Data.Functor.Rep

type Rep Identity = ()
type Key Identity 
Instance details

Defined in Data.Key

type Key Identity = ()
type StM Identity a 
Instance details

Defined in Control.Monad.Trans.Control

type StM Identity a = a
newtype MVector s (Identity a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s (Identity a) = MV_Identity (MVector s a)
type Rep (Identity a)

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

type Rep (Identity a) = D1 ('MetaData "Identity" "Data.Functor.Identity" "base" 'True) (C1 ('MetaCons "Identity" 'PrefixI 'True) (S1 ('MetaSel ('Just "runIdentity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))
type Element (Identity a) 
Instance details

Defined in Data.MonoTraversable

type Element (Identity a) = a
type Element (Identity a) 
Instance details

Defined in Universum.Container.Class

type Element (Identity a) = ElementDefault (Identity a)
newtype Vector (Identity a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector (Identity a) = V_Identity (Vector 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))

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

data TVar a #

Shared memory locations that support atomic memory transactions.

Instances

Instances details
Eq (TVar a)

Since: base-4.8.0.0

Instance details

Defined in GHC.Conc.Sync

Methods

(==) :: TVar a -> TVar a -> Bool #

(/=) :: TVar a -> TVar a -> Bool #

data STM a #

A monad supporting atomic memory transactions.

Instances

Instances details
Alternative STM

Since: base-4.8.0.0

Instance details

Defined in GHC.Conc.Sync

Methods

empty :: STM a #

(<|>) :: STM a -> STM a -> STM a #

some :: STM a -> STM [a] #

many :: STM a -> STM [a] #

Applicative STM

Since: base-4.8.0.0

Instance details

Defined in GHC.Conc.Sync

Methods

pure :: a -> STM a #

(<*>) :: STM (a -> b) -> STM a -> STM b #

liftA2 :: (a -> b -> c) -> STM a -> STM b -> STM c #

(*>) :: STM a -> STM b -> STM b #

(<*) :: STM a -> STM b -> STM a #

Functor STM

Since: base-4.3.0.0

Instance details

Defined in GHC.Conc.Sync

Methods

fmap :: (a -> b) -> STM a -> STM b #

(<$) :: a -> STM b -> STM a #

Monad STM

Since: base-4.3.0.0

Instance details

Defined in GHC.Conc.Sync

Methods

(>>=) :: STM a -> (a -> STM b) -> STM b #

(>>) :: STM a -> STM b -> STM b #

return :: a -> STM a #

MonadPlus STM

Since: base-4.3.0.0

Instance details

Defined in GHC.Conc.Sync

Methods

mzero :: STM a #

mplus :: STM a -> STM a -> STM a #

MonadCatch STM 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => STM a -> (e -> STM a) -> STM a #

MonadThrow STM 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> STM a #

MonadBaseControl STM STM 
Instance details

Defined in Control.Monad.Trans.Control

Associated Types

type StM STM a #

Methods

liftBaseWith :: (RunInBase STM STM -> STM a) -> STM a #

restoreM :: StM STM a -> STM a #

RandomGen g => FrozenGen (TGen g) STM

Since: random-1.2.1

Instance details

Defined in System.Random.Stateful

Associated Types

type MutableGen (TGen g) STM = (g :: Type) #

Methods

freezeGen :: MutableGen (TGen g) STM -> STM (TGen g) #

thawGen :: TGen g -> STM (MutableGen (TGen g) STM) #

RandomGen g => StatefulGen (TGenM g) STM

Since: random-1.2.1

Instance details

Defined in System.Random.Stateful

RandomGen r => RandomGenM (TGenM r) r STM 
Instance details

Defined in System.Random.Stateful

Methods

applyRandomGenM :: (r -> (a, r)) -> TGenM r -> STM a #

type StM STM a 
Instance details

Defined in Control.Monad.Trans.Control

type StM STM a = a
type MutableGen (TGen g) STM 
Instance details

Defined in System.Random.Stateful

type MutableGen (TGen g) STM = TGenM g

writeTVar :: TVar a -> a -> STM () #

Write the supplied value into a TVar.

readTVar :: TVar a -> STM a #

Return the current value stored in a TVar.

newTVar :: a -> STM (TVar a) #

Create a new TVar holding a value supplied

atomically :: STM a -> IO a #

Perform a series of STM actions atomically.

Using atomically inside an unsafePerformIO or unsafeInterleaveIO subverts some of guarantees that STM provides. It makes it possible to run a transaction inside of another transaction, depending on when the thunk is evaluated. If a nested transaction is attempted, an exception is thrown by the runtime. It is possible to safely use atomically inside unsafePerformIO or unsafeInterleaveIO, but the typechecker does not rule out programs that may attempt nested transactions, meaning that the programmer must take special care to prevent these.

However, there are functions for creating transactional variables that can always be safely called in unsafePerformIO. See: newTVarIO, newTChanIO, newBroadcastTChanIO, newTQueueIO, newTBQueueIO, and newTMVarIO.

Using unsafePerformIO inside of atomically is also dangerous but for different reasons. See unsafeIOToSTM for more on this.

data IORef a #

A mutable variable in the IO monad

Instances

Instances details
NFData1 IORef

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> IORef a -> () #

NFData (IORef a)

NOTE: Only strict in the reference and not the referenced value.

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: IORef a -> () #

Eq (IORef a)

Pointer equality.

Since: base-4.0.0.0

Instance details

Defined in GHC.IORef

Methods

(==) :: IORef a -> IORef a -> Bool #

(/=) :: IORef a -> IORef a -> Bool #

MutableAtomicRef (IORef a) 
Instance details

Defined in Data.Mutable.Class

Methods

atomicModifyRef :: (PrimMonad m, PrimState m ~ MCState (IORef a)) => IORef a -> (RefElement (IORef a) -> (RefElement (IORef a), a0)) -> m a0 #

atomicModifyRef' :: (PrimMonad m, PrimState m ~ MCState (IORef a)) => IORef a -> (RefElement (IORef a) -> (RefElement (IORef a), a0)) -> m a0 #

Monoid w => MutableCollection (IORef w) 
Instance details

Defined in Data.Mutable.Class

Associated Types

type CollElement (IORef w) #

Methods

newColl :: (PrimMonad m, PrimState m ~ MCState (IORef w)) => m (IORef w) #

MutableContainer (IORef a) 
Instance details

Defined in Data.Mutable.Class

Associated Types

type MCState (IORef a) #

IsSequence a => MutablePopBack (IORef a) 
Instance details

Defined in Data.Mutable.Class

Methods

popBack :: (PrimMonad m, PrimState m ~ MCState (IORef a)) => IORef a -> m (Maybe (CollElement (IORef a))) #

IsSequence a => MutablePopFront (IORef a) 
Instance details

Defined in Data.Mutable.Class

Methods

popFront :: (PrimMonad m, PrimState m ~ MCState (IORef a)) => IORef a -> m (Maybe (CollElement (IORef a))) #

IsSequence a => MutablePushBack (IORef a) 
Instance details

Defined in Data.Mutable.Class

Methods

pushBack :: (PrimMonad m, PrimState m ~ MCState (IORef a)) => IORef a -> CollElement (IORef a) -> m () #

IsSequence a => MutablePushFront (IORef a) 
Instance details

Defined in Data.Mutable.Class

Methods

pushFront :: (PrimMonad m, PrimState m ~ MCState (IORef a)) => IORef a -> CollElement (IORef a) -> m () #

MutableRef (IORef a) 
Instance details

Defined in Data.Mutable.Class

Associated Types

type RefElement (IORef a) #

Methods

newRef :: (PrimMonad m, PrimState m ~ MCState (IORef a)) => RefElement (IORef a) -> m (IORef a) #

readRef :: (PrimMonad m, PrimState m ~ MCState (IORef a)) => IORef a -> m (RefElement (IORef a)) #

writeRef :: (PrimMonad m, PrimState m ~ MCState (IORef a)) => IORef a -> RefElement (IORef a) -> m () #

modifyRef :: (PrimMonad m, PrimState m ~ MCState (IORef a)) => IORef a -> (RefElement (IORef a) -> RefElement (IORef a)) -> m () #

modifyRef' :: (PrimMonad m, PrimState m ~ MCState (IORef a)) => IORef a -> (RefElement (IORef a) -> RefElement (IORef a)) -> m () #

PrimUnlifted (IORef a) 
Instance details

Defined in Data.Primitive.Unlifted.Class

Associated Types

type Unlifted (IORef a) :: TYPE UnliftedRep #

type CollElement (IORef w) 
Instance details

Defined in Data.Mutable.Class

type MCState (IORef a) 
Instance details

Defined in Data.Mutable.Class

type RefElement (IORef a) 
Instance details

Defined in Data.Mutable.Class

type RefElement (IORef a) = a
type Unlifted (IORef a) 
Instance details

Defined in Data.Primitive.Unlifted.Class

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.

prettySrcLoc :: SrcLoc -> String #

Pretty print a SrcLoc.

Since: base-4.9.0.0

prettyCallStack :: CallStack -> String #

Pretty print a CallStack.

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

Instances details
Exception AsyncCancelled 
Instance details

Defined in Control.Concurrent.Async

Exception ExceptionInLinkedThread 
Instance details

Defined in Control.Concurrent.Async

Exception Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Exception 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 AllocationLimitExceeded

Since: base-4.8.0.0

Instance details

Defined in GHC.IO.Exception

Exception ArrayException

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Exception AssertionFailed

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Exception AsyncException

Since: base-4.7.0.0

Instance details

Defined in GHC.IO.Exception

Exception BlockedIndefinitelyOnMVar

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Exception BlockedIndefinitelyOnSTM

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Exception CompactionFailed

Since: base-4.10.0.0

Instance details

Defined in GHC.IO.Exception

Exception Deadlock

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Exception ExitCode

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Exception FixIOException

Since: base-4.11.0.0

Instance details

Defined in GHC.IO.Exception

Exception IOException

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Exception SomeAsyncException

Since: base-4.7.0.0

Instance details

Defined in GHC.IO.Exception

Exception ASCII7_Invalid 
Instance details

Defined in Basement.String.Encoding.ASCII7

Methods

toException :: ASCII7_Invalid -> SomeException #

fromException :: SomeException -> Maybe ASCII7_Invalid #

displayException :: ASCII7_Invalid -> String #

Exception ISO_8859_1_Invalid 
Instance details

Defined in Basement.String.Encoding.ISO_8859_1

Methods

toException :: ISO_8859_1_Invalid -> SomeException #

fromException :: SomeException -> Maybe ISO_8859_1_Invalid #

displayException :: ISO_8859_1_Invalid -> String #

Exception UTF16_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF16

Methods

toException :: UTF16_Invalid -> SomeException #

fromException :: SomeException -> Maybe UTF16_Invalid #

displayException :: UTF16_Invalid -> String #

Exception UTF32_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF32

Methods

toException :: UTF32_Invalid -> SomeException #

fromException :: SomeException -> Maybe UTF32_Invalid #

displayException :: UTF32_Invalid -> String #

Exception CryptoError 
Instance details

Defined in Crypto.Error.Types

Exception EsqueletoError 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Exception OnClauseWithoutMatchingJoinException 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Exception RenderExprException

Since: esqueleto-3.2.0

Instance details

Defined in Database.Esqueleto.Internal.Internal

Exception EncapsulatedPopperException 
Instance details

Defined in Network.HTTP.Client.Request

Methods

toException :: EncapsulatedPopperException -> SomeException #

fromException :: SomeException -> Maybe EncapsulatedPopperException #

displayException :: EncapsulatedPopperException -> String #

Exception HttpException 
Instance details

Defined in Network.HTTP.Client.Types

Exception HttpExceptionContentWrapper 
Instance details

Defined in Network.HTTP.Client.Types

Methods

toException :: HttpExceptionContentWrapper -> SomeException #

fromException :: SomeException -> Maybe HttpExceptionContentWrapper #

displayException :: HttpExceptionContentWrapper -> String #

Exception DigestAuthException 
Instance details

Defined in Network.HTTP.Client.TLS

Exception DecodeError 
Instance details

Defined in Network.HPACK.Types

Exception HTTP2Error 
Instance details

Defined in Network.HTTP2.Frame.Types

Exception RemoteSentGoAwayFrame 
Instance details

Defined in Network.HTTP2.Client2.Dispatch

Methods

toException :: RemoteSentGoAwayFrame -> SomeException #

fromException :: SomeException -> Maybe RemoteSentGoAwayFrame #

displayException :: RemoteSentGoAwayFrame -> String #

Exception ClientError 
Instance details

Defined in Network.HTTP2.Client2.Exceptions

Methods

toException :: ClientError -> SomeException #

fromException :: SomeException -> Maybe ClientError #

displayException :: ClientError -> 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 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 LndError 
Instance details

Defined in LndClient.Data.Type

Exception NullError 
Instance details

Defined in Data.NonNull

Methods

toException :: NullError -> SomeException #

fromException :: SomeException -> Maybe NullError #

displayException :: NullError -> String #

Exception BitcoinException 
Instance details

Defined in Network.Bitcoin.Types

Methods

toException :: BitcoinException -> SomeException #

fromException :: SomeException -> Maybe BitcoinException #

displayException :: BitcoinException -> String #

Exception PersistUnsafeMigrationException 
Instance details

Defined in Database.Persist.Sql.Migration

Exception PersistentSqlException 
Instance details

Defined in Database.Persist.Sql.Types

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

Exception UpdateException 
Instance details

Defined in Database.Persist.Types.Base

Exception PostgresServerVersionError 
Instance details

Defined in Database.Persist.Postgresql

Methods

toException :: PostgresServerVersionError -> SomeException #

fromException :: SomeException -> Maybe PostgresServerVersionError #

displayException :: PostgresServerVersionError -> String #

Exception FormatError 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Exception QueryError 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Exception SqlError 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Exception InvalidAccess 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Exception ResourceCleanupException 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Exception AsyncExceptionWrapper 
Instance details

Defined in Control.Exception.Safe

Exception StringException 
Instance details

Defined in Control.Exception.Safe

Exception SyncExceptionWrapper 
Instance details

Defined in Control.Exception.Safe

Exception UnicodeException 
Instance details

Defined in Data.Text.Encoding.Error

Exception Bug 
Instance details

Defined in Universum.Exception

Exception AsyncExceptionWrapper

Since: unliftio-0.1.0.0

Instance details

Defined in UnliftIO.Exception

Exception StringException

Since: unliftio-0.1.0.0

Instance details

Defined in UnliftIO.Exception

Exception SyncExceptionWrapper

Since: unliftio-0.1.0.0

Instance details

Defined in UnliftIO.Exception

Exception ConcException 
Instance details

Defined in UnliftIO.Internals.Async

Exception ExceptionInsideResponseBody 
Instance details

Defined in Network.Wai.Handler.Warp.Types

Methods

toException :: ExceptionInsideResponseBody -> SomeException #

fromException :: SomeException -> Maybe ExceptionInsideResponseBody #

displayException :: ExceptionInsideResponseBody -> String #

Exception InvalidRequest 
Instance details

Defined in Network.Wai.Handler.Warp.Types

Exception WarpTLSException 
Instance details

Defined in Network.Wai.Handler.WarpTLS

Exception ParseException 
Instance details

Defined in Data.Yaml.Internal

Exception AuthException 
Instance details

Defined in Yesod.Auth

Exception HandlerContents 
Instance details

Defined in Yesod.Core.Types

(Show source, Typeable source, Typeable target) => Exception (TryFromException source target) 
Instance details

Defined in Witch.TryFromException

newtype Const a (b :: k) #

The Const functor.

Constructors

Const 

Fields

Instances

Instances details
Generic1 (Const a :: k -> Type) 
Instance details

Defined in Data.Functor.Const

Associated Types

type Rep1 (Const a) :: k -> Type #

Methods

from1 :: forall (a0 :: k0). Const a a0 -> Rep1 (Const a) a0 #

to1 :: forall (a0 :: k0). Rep1 (Const a) a0 -> Const a a0 #

Unbox a => Vector Vector (Const a b) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: 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 #

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)) #

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 #

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 #

Biapplicative (Const :: Type -> Type -> Type) 
Instance details

Defined in Data.Biapplicative

Methods

bipure :: a -> b -> Const a b #

(<<*>>) :: Const (a -> b) (c -> d) -> Const a c -> Const b d #

biliftA2 :: (a -> b -> c) -> (d -> e -> f) -> Const a d -> Const b e -> Const c f #

(*>>) :: Const a b -> Const c d -> Const c d #

(<<*) :: Const a b -> Const c d -> Const a b #

NFData2 (Const :: Type -> Type -> Type)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf2 :: (a -> ()) -> (b -> ()) -> Const a b -> () #

Hashable2 (Const :: Type -> Type -> Type) 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt2 :: (Int -> a -> Int) -> (Int -> b -> Int) -> Int -> Const a b -> Int #

Biapply (Const :: Type -> Type -> Type) 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(<<.>>) :: Const (a -> b) (c -> d) -> Const a c -> Const b d #

(.>>) :: Const a b -> Const c d -> Const c d #

(<<.) :: Const a b -> Const c d -> Const a b #

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 #

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 #

foldMap' :: Monoid m0 => (a -> m0) -> Const m a -> m0 #

foldr :: (a -> b -> b) -> b -> Const m a -> b #

foldr' :: (a -> b -> b) -> b -> Const m a -> b #

foldl :: (b -> a -> b) -> b -> Const m a -> b #

foldl' :: (b -> a -> b) -> b -> Const m a -> b #

foldr1 :: (a -> a -> a) -> Const m a -> a #

foldl1 :: (a -> a -> a) -> Const m a -> a #

toList :: Const m a -> [a] #

null :: Const m a -> Bool #

length :: Const m a -> Int #

elem :: Eq a => a -> Const m a -> Bool #

maximum :: Ord a => Const m a -> a #

minimum :: Ord a => Const m a -> a #

sum :: Num a => Const m a -> a #

product :: Num a => Const m a -> a #

Eq a => Eq1 (Const a :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftEq :: (a0 -> b -> Bool) -> Const a a0 -> Const a b -> Bool #

Ord a => Ord1 (Const a :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftCompare :: (a0 -> b -> Ordering) -> Const a a0 -> Const a b -> Ordering #

Read a => Read1 (Const a :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftReadsPrec :: (Int -> ReadS a0) -> ReadS [a0] -> Int -> ReadS (Const a a0) #

liftReadList :: (Int -> ReadS a0) -> ReadS [a0] -> ReadS [Const a a0] #

liftReadPrec :: ReadPrec a0 -> ReadPrec [a0] -> ReadPrec (Const a a0) #

liftReadListPrec :: ReadPrec a0 -> ReadPrec [a0] -> ReadPrec [Const a a0] #

Show a => Show1 (Const a :: Type -> 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 #

Traversable (Const m :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Const m a -> f (Const m b) #

sequenceA :: Applicative f => Const m (f a) -> f (Const m a) #

mapM :: Monad m0 => (a -> m0 b) -> Const m a -> m0 (Const m b) #

sequence :: Monad m0 => Const m (m0 a) -> m0 (Const m a) #

Monoid m => Applicative (Const m :: Type -> Type)

Since: base-2.0.1

Instance details

Defined in Data.Functor.Const

Methods

pure :: a -> Const m a #

(<*>) :: Const m (a -> b) -> Const m a -> Const m b #

liftA2 :: (a -> b -> c) -> Const m a -> Const m b -> Const m c #

(*>) :: Const m a -> Const m b -> Const m b #

(<*) :: Const m a -> Const m b -> Const m a #

Functor (Const m :: Type -> Type)

Since: base-2.1

Instance details

Defined in Data.Functor.Const

Methods

fmap :: (a -> b) -> Const m a -> Const m b #

(<$) :: a -> Const m b -> Const m a #

NFData a => NFData1 (Const a :: Type -> Type)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a0 -> ()) -> Const a a0 -> () #

Hashable a => Hashable1 (Const a :: Type -> Type) 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a0 -> Int) -> Int -> Const a a0 -> Int #

Adjustable (Const e :: Type -> Type) 
Instance details

Defined in Data.Key

Methods

adjust :: (a -> a) -> Key (Const e) -> Const e a -> Const e a #

replace :: Key (Const e) -> a -> Const e a -> Const e a #

FoldableWithKey (Const e :: Type -> Type) 
Instance details

Defined in Data.Key

Methods

toKeyedList :: Const e a -> [(Key (Const e), a)] #

foldMapWithKey :: Monoid m => (Key (Const e) -> a -> m) -> Const e a -> m #

foldrWithKey :: (Key (Const e) -> a -> b -> b) -> b -> Const e a -> b #

foldlWithKey :: (b -> Key (Const e) -> a -> b) -> b -> Const e a -> b #

Indexable (Const e :: Type -> Type) 
Instance details

Defined in Data.Key

Methods

index :: Const e a -> Key (Const e) -> a #

Keyed (Const e :: Type -> Type) 
Instance details

Defined in Data.Key

Methods

mapWithKey :: (Key (Const e) -> a -> b) -> Const e a -> Const e b #

Lookup (Const e :: Type -> Type) 
Instance details

Defined in Data.Key

Methods

lookup :: Key (Const e) -> Const e a -> Maybe a #

TraversableWithKey (Const e :: Type -> Type) 
Instance details

Defined in Data.Key

Methods

traverseWithKey :: Applicative f => (Key (Const e) -> a -> f b) -> Const e a -> f (Const e b) #

mapWithKeyM :: Monad m => (Key (Const e) -> a -> m b) -> Const e a -> m (Const e b) #

Semigroup m => Apply (Const m :: Type -> Type)

A Const m is not Applicative unless its m is a Monoid, but it is an instance of Apply

Instance details

Defined in Data.Functor.Bind.Class

Methods

(<.>) :: Const m (a -> b) -> Const m a -> Const m b #

(.>) :: Const m a -> Const m b -> Const m b #

(<.) :: Const m a -> Const m b -> Const m a #

liftF2 :: (a -> b -> c) -> Const m a -> Const m b -> Const m 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 a, FromJSONKey a) => FromJSONKey (Const a b) 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON a => ToJSON (Const a b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Const a b -> Value #

toEncoding :: Const a b -> Encoding #

toJSONList :: [Const a b] -> Value #

toEncodingList :: [Const a b] -> Encoding #

(ToJSON a, ToJSONKey a) => ToJSONKey (Const a b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

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

IsString a => IsString (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.String

Methods

fromString :: String -> Const a b #

Storable a => Storable (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

sizeOf :: Const a b -> Int #

alignment :: Const a b -> Int #

peekElemOff :: Ptr (Const a b) -> Int -> IO (Const a b) #

pokeElemOff :: Ptr (Const a b) -> Int -> Const a b -> IO () #

peekByteOff :: Ptr b0 -> Int -> IO (Const a b) #

pokeByteOff :: Ptr b0 -> Int -> Const a b -> IO () #

peek :: Ptr (Const a b) -> IO (Const a b) #

poke :: Ptr (Const a b) -> Const a b -> IO () #

Monoid a => Monoid (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

mempty :: Const a b #

mappend :: Const a b -> Const a b -> Const a b #

mconcat :: [Const a b] -> Const a b #

Semigroup a => Semigroup (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

(<>) :: Const a b -> Const a b -> Const a b #

sconcat :: NonEmpty (Const a b) -> Const a b #

stimes :: Integral b0 => b0 -> Const a b -> Const a b #

Bounded a => Bounded (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

minBound :: Const a b #

maxBound :: Const a b #

Enum a => Enum (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

succ :: Const a b -> Const a b #

pred :: Const a b -> Const a b #

toEnum :: Int -> Const a b #

fromEnum :: Const a b -> Int #

enumFrom :: Const a b -> [Const a b] #

enumFromThen :: Const a b -> Const a b -> [Const a b] #

enumFromTo :: Const a b -> Const a b -> [Const a b] #

enumFromThenTo :: Const a b -> Const a b -> Const a b -> [Const a b] #

Floating a => Floating (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

pi :: Const a b #

exp :: Const a b -> Const a b #

log :: Const a b -> Const a b #

sqrt :: Const a b -> Const a b #

(**) :: Const a b -> Const a b -> Const a b #

logBase :: Const a b -> Const a b -> Const a b #

sin :: Const a b -> Const a b #

cos :: Const a b -> Const a b #

tan :: Const a b -> Const a b #

asin :: Const a b -> Const a b #

acos :: Const a b -> Const a b #

atan :: Const a b -> Const a b #

sinh :: Const a b -> Const a b #

cosh :: Const a b -> Const a b #

tanh :: Const a b -> Const a b #

asinh :: Const a b -> Const a b #

acosh :: Const a b -> Const a b #

atanh :: Const a b -> Const a b #

log1p :: Const a b -> Const a b #

expm1 :: Const a b -> Const a b #

log1pexp :: Const a b -> Const a b #

log1mexp :: Const a b -> Const a b #

RealFloat a => RealFloat (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

floatRadix :: Const a b -> Integer #

floatDigits :: Const a b -> Int #

floatRange :: Const a b -> (Int, Int) #

decodeFloat :: Const a b -> (Integer, Int) #

encodeFloat :: Integer -> Int -> Const a b #

exponent :: Const a b -> Int #

significand :: Const a b -> Const a b #

scaleFloat :: Int -> Const a b -> Const a b #

isNaN :: Const a b -> Bool #

isInfinite :: Const a b -> Bool #

isDenormalized :: Const a b -> Bool #

isNegativeZero :: Const a b -> Bool #

isIEEE :: Const a b -> Bool #

atan2 :: Const a b -> Const a b -> Const a b #

Generic (Const a b) 
Instance details

Defined in Data.Functor.Const

Associated Types

type Rep (Const a b) :: Type -> Type #

Methods

from :: Const a b -> Rep (Const a b) x #

to :: Rep (Const a b) x -> Const a b #

Ix a => Ix (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

range :: (Const a b, Const a b) -> [Const a b] #

index :: (Const a b, Const a b) -> Const a b -> Int #

unsafeIndex :: (Const a b, Const a b) -> Const a b -> Int #

inRange :: (Const a b, Const a b) -> Const a b -> Bool #

rangeSize :: (Const a b, Const a b) -> Int #

unsafeRangeSize :: (Const a b, Const a b) -> Int #

Num a => Num (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

(+) :: Const a b -> Const a b -> Const a b #

(-) :: Const a b -> Const a b -> Const a b #

(*) :: Const a b -> Const a b -> Const a b #

negate :: Const a b -> Const a b #

abs :: Const a b -> Const a b #

signum :: Const a b -> Const a b #

fromInteger :: Integer -> Const a b #

Read a => Read (Const a b)

This instance would be equivalent to the derived instances of the Const newtype if the getConst field were removed

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Const

Fractional a => Fractional (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

(/) :: Const a b -> Const a b -> Const a b #

recip :: Const a b -> Const a b #

fromRational :: Rational -> Const a b #

Integral a => Integral (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

quot :: Const a b -> Const a b -> Const a b #

rem :: Const a b -> Const a b -> Const a b #

div :: Const a b -> Const a b -> Const a b #

mod :: Const a b -> Const a b -> Const a b #

quotRem :: Const a b -> Const a b -> (Const a b, Const a b) #

divMod :: Const a b -> Const a b -> (Const a b, Const a b) #

toInteger :: Const a b -> Integer #

Real a => Real (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

toRational :: Const a b -> Rational #

RealFrac a => RealFrac (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

properFraction :: Integral b0 => Const a b -> (b0, Const a b) #

truncate :: Integral b0 => Const a b -> b0 #

round :: Integral b0 => Const a b -> b0 #

ceiling :: Integral b0 => Const a b -> b0 #

floor :: Integral b0 => Const a b -> b0 #

Show a => Show (Const a b)

This instance would be equivalent to the derived instances of the Const newtype if the getConst field were removed

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Const

Methods

showsPrec :: Int -> Const a b -> ShowS #

show :: Const a b -> String #

showList :: [Const a b] -> ShowS #

NFData a => NFData (Const a b)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Const a b -> () #

Eq a => Eq (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

(==) :: Const a b -> Const a b -> Bool #

(/=) :: Const a b -> Const a b -> Bool #

Ord a => Ord (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

compare :: Const a b -> Const a b -> Ordering #

(<) :: Const a b -> Const a b -> Bool #

(<=) :: Const a b -> Const a b -> Bool #

(>) :: Const a b -> Const a b -> Bool #

(>=) :: Const a b -> Const a b -> Bool #

max :: Const a b -> Const a b -> Const a b #

min :: Const a b -> Const a b -> Const a b #

Hashable a => Hashable (Const a b) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Const a b -> Int #

hash :: Const a b -> Int #

FromHttpApiData a => FromHttpApiData (Const a b)

Since: http-api-data-0.4.2

Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData a => ToHttpApiData (Const a b)

Since: http-api-data-0.4.2

Instance details

Defined in Web.Internal.HttpApiData

MonoFoldable (Const m a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m0 => (Element (Const m a) -> m0) -> Const m a -> m0 #

ofoldr :: (Element (Const m a) -> b -> b) -> b -> Const m a -> b #

ofoldl' :: (a0 -> Element (Const m a) -> a0) -> a0 -> Const m a -> a0 #

otoList :: Const m a -> [Element (Const m a)] #

oall :: (Element (Const m a) -> Bool) -> Const m a -> Bool #

oany :: (Element (Const m a) -> Bool) -> Const m a -> Bool #

onull :: Const m a -> Bool #

olength :: Const m a -> Int #

olength64 :: Const m a -> Int64 #

ocompareLength :: Integral i => Const m a -> i -> Ordering #

otraverse_ :: Applicative f => (Element (Const m a) -> f b) -> Const m a -> f () #

ofor_ :: Applicative f => Const m a -> (Element (Const m a) -> f b) -> f () #

omapM_ :: Applicative m0 => (Element (Const m a) -> m0 ()) -> Const m a -> m0 () #

oforM_ :: Applicative m0 => Const m a -> (Element (Const m a) -> m0 ()) -> m0 () #

ofoldlM :: Monad m0 => (a0 -> Element (Const m a) -> m0 a0) -> a0 -> Const m a -> m0 a0 #

ofoldMap1Ex :: Semigroup m0 => (Element (Const m a) -> m0) -> Const m a -> m0 #

ofoldr1Ex :: (Element (Const m a) -> Element (Const m a) -> Element (Const m a)) -> Const m a -> Element (Const m a) #

ofoldl1Ex' :: (Element (Const m a) -> Element (Const m a) -> Element (Const m a)) -> Const m a -> Element (Const m a) #

headEx :: Const m a -> Element (Const m a) #

lastEx :: Const m a -> Element (Const m a) #

unsafeHead :: Const m a -> Element (Const m a) #

unsafeLast :: Const m a -> Element (Const m a) #

maximumByEx :: (Element (Const m a) -> Element (Const m a) -> Ordering) -> Const m a -> Element (Const m a) #

minimumByEx :: (Element (Const m a) -> Element (Const m a) -> Ordering) -> Const m a -> Element (Const m a) #

oelem :: Element (Const m a) -> Const m a -> Bool #

onotElem :: Element (Const m a) -> Const m a -> Bool #

MonoFunctor (Const m a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Const m a) -> Element (Const m a)) -> Const m a -> Const m a #

Monoid m => MonoPointed (Const m a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Const m a) -> Const m a #

MonoTraversable (Const m a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (Const m a) -> f (Element (Const m a))) -> Const m a -> f (Const m a) #

omapM :: Applicative m0 => (Element (Const m a) -> m0 (Element (Const m a))) -> Const m a -> m0 (Const m a) #

Pretty a => Pretty (Const a b) 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Const a b -> Doc ann #

prettyList :: [Const a b] -> Doc ann #

Prim a => Prim (Const a b)

Since: primitive-0.6.5.0

Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: Const a b -> Int# #

alignment# :: Const a b -> Int# #

indexByteArray# :: ByteArray# -> Int# -> Const a b #

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, Const a b #) #

writeByteArray# :: MutableByteArray# s -> Int# -> Const a b -> State# s -> State# s #

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> Const a b -> State# s -> State# s #

indexOffAddr# :: Addr# -> Int# -> Const a b #

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, Const a b #) #

writeOffAddr# :: Addr# -> Int# -> Const a b -> State# s -> State# s #

setOffAddr# :: Addr# -> Int# -> Int# -> Const a b -> State# s -> State# s #

Container (Const a b) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Const a b) #

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 #

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 #

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)) #

safeMaximum :: Const a b -> Maybe (Element (Const a b)) #

safeMinimum :: Const a b -> Maybe (Element (Const a b)) #

safeFoldr1 :: (Element (Const a b) -> Element (Const a b) -> Element (Const a b)) -> Const a b -> Maybe (Element (Const a b)) #

safeFoldl1 :: (Element (Const a b) -> Element (Const a b) -> Element (Const a b)) -> Const a b -> Maybe (Element (Const a b)) #

Unbox a => Unbox (Const a b) 
Instance details

Defined in Data.Vector.Unboxed.Base

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 Key (Const e :: Type -> Type) 
Instance details

Defined in Data.Key

type Key (Const e :: Type -> Type) = Void
type Rep (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

type Rep (Const a b) = D1 ('MetaData "Const" "Data.Functor.Const" "base" 'True) (C1 ('MetaCons "Const" 'PrefixI 'True) (S1 ('MetaSel ('Just "getConst") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))
type Element (Const m a) 
Instance details

Defined in Data.MonoTraversable

type Element (Const m a) = a
type Element (Const a b) 
Instance details

Defined in Universum.Container.Class

type Element (Const a b) = ElementDefault (Const a b)
newtype Vector (Const a b) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector (Const a b) = V_Const (Vector a)

foldrM :: (Foldable t, Monad m) => (a -> b -> m b) -> b -> t a -> m b #

Right-to-left monadic fold over the elements of a structure.

Given a structure t with elements (a, b, c, ..., x, y), the result of a fold with an operator function f is equivalent to:

foldrM f z t = do
    yy <- f y z
    xx <- f x yy
    ...
    bb <- f b cc
    aa <- f a bb
    return aa -- Just @return z@ when the structure is empty

For a Monad m, given two functions f1 :: a -> m b and f2 :: b -> m c, their Kleisli composition (f1 >=> f2) :: a -> m c is defined by:

(f1 >=> f2) a = f1 a >>= f2

Another way of thinking about foldrM is that it amounts to an application to z of a Kleisli composition:

foldrM f z t = f y >=> f x >=> ... >=> f b >=> f a $ z

The monadic effects of foldrM are sequenced from right to left, and e.g. folds of infinite lists will diverge.

If at some step the bind operator (>>=) short-circuits (as with, e.g., mzero in a MonadPlus), the evaluated effects will be from a tail of the element sequence. If you want to evaluate the monadic effects in left-to-right order, or perhaps be able to short-circuit after an initial sequence of elements, you'll need to use foldlM instead.

If the monadic effects don't short-circuit, the outermost application of f is to the leftmost element a, so that, ignoring effects, the result looks like a right fold:

a `f` (b `f` (c `f` (... (x `f` (y `f` z))))).

Examples

Expand

Basic usage:

>>> let f i acc = do { print i ; return $ i : acc }
>>> foldrM f [] [0..3]
3
2
1
0
[0,1,2,3]

foldlM :: (Foldable t, Monad m) => (b -> a -> m b) -> b -> t a -> m b #

Left-to-right monadic fold over the elements of a structure.

Given a structure t with elements (a, b, ..., w, x, y), the result of a fold with an operator function f is equivalent to:

foldlM f z t = do
    aa <- f z a
    bb <- f aa b
    ...
    xx <- f ww x
    yy <- f xx y
    return yy -- Just @return z@ when the structure is empty

For a Monad m, given two functions f1 :: a -> m b and f2 :: b -> m c, their Kleisli composition (f1 >=> f2) :: a -> m c is defined by:

(f1 >=> f2) a = f1 a >>= f2

Another way of thinking about foldlM is that it amounts to an application to z of a Kleisli composition:

foldlM f z t =
    flip f a >=> flip f b >=> ... >=> flip f x >=> flip f y $ z

The monadic effects of foldlM are sequenced from left to right.

If at some step the bind operator (>>=) short-circuits (as with, e.g., mzero in a MonadPlus), the evaluated effects will be from an initial segment of the element sequence. If you want to evaluate the monadic effects in right-to-left order, or perhaps be able to short-circuit after processing a tail of the sequence of elements, you'll need to use foldrM instead.

If the monadic effects don't short-circuit, the outermost application of f is to the rightmost element y, so that, ignoring effects, the result looks like a left fold:

((((z `f` a) `f` b) ... `f` w) `f` x) `f` y

Examples

Expand

Basic usage:

>>> let f a e = do { print e ; return $ e : a }
>>> foldlM f [] [0..3]
0
1
2
3
[3,2,1,0]

concatMap :: Foldable t => (a -> [b]) -> t a -> [b] #

Map a function over all the elements of a container and concatenate the resulting lists.

Examples

Expand

Basic usage:

>>> concatMap (take 3) [[1..], [10..], [100..], [1000..]]
[1,2,3,10,11,12,100,101,102,1000,1001,1002]
>>> concatMap (take 3) (Just [1..])
[1,2,3]

concat :: Foldable t => t [a] -> [a] #

The concatenation of all the elements of a container of lists.

Examples

Expand

Basic usage:

>>> concat (Just [1, 2, 3])
[1,2,3]
>>> concat (Left 42)
[]
>>> concat [[1, 2, 3], [4, 5], [6], []]
[1,2,3,4,5,6]

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]

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]]

tails :: [a] -> [[a]] #

\(\mathcal{O}(n)\). 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 _|_ = _|_ : _|_

subsequences :: [a] -> [[a]] #

The subsequences function returns the list of all subsequences of the argument.

>>> subsequences "abc"
["","a","b","ab","c","ac","bc","abc"]

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 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 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"]

partition :: (a -> Bool) -> [a] -> ([a], [a]) #

The partition function takes a predicate a list and returns the pair of lists of elements which do and do not satisfy the predicate, respectively; i.e.,

partition p xs == (filter p xs, filter (not . p) xs)
>>> partition (`elem` "aeiou") "Hello World!"
("eoo","Hll Wrld!")

isPrefixOf :: Eq a => [a] -> [a] -> Bool #

\(\mathcal{O}(\min(m,n))\). 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

intersperse :: a -> [a] -> [a] #

\(\mathcal{O}(n)\). 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"

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"

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.

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.

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.

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.

genericLength :: Num i => [a] -> i #

\(\mathcal{O}(n)\). 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.

>>> genericLength [1, 2, 3] :: Int
3
>>> genericLength [1, 2, 3] :: Float
3.0

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.

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"

Constructors

Last 

Fields

Instances

Instances details
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 #

Foldable Last

Since: base-4.8.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Last m -> m #

foldMap :: Monoid m => (a -> m) -> Last a -> m #

foldMap' :: Monoid m => (a -> m) -> Last a -> m #

foldr :: (a -> b -> b) -> b -> Last a -> b #

foldr' :: (a -> b -> b) -> b -> Last a -> b #

foldl :: (b -> a -> b) -> b -> Last a -> b #

foldl' :: (b -> a -> b) -> b -> Last a -> b #

foldr1 :: (a -> a -> a) -> Last a -> a #

foldl1 :: (a -> a -> a) -> Last a -> a #

toList :: Last a -> [a] #

null :: Last a -> Bool #

length :: Last a -> Int #

elem :: Eq a => a -> Last a -> Bool #

maximum :: Ord a => Last a -> a #

minimum :: Ord a => Last a -> a #

sum :: Num a => Last a -> a #

product :: Num a => Last a -> a #

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) #

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 #

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 #

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 #

NFData1 Last

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> Last a -> () #

Apply Last 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(<.>) :: Last (a -> b) -> Last a -> Last b #

(.>) :: Last a -> Last b -> Last b #

(<.) :: Last a -> Last b -> Last a #

liftF2 :: (a -> b -> c) -> Last a -> Last b -> Last c #

Bind Last 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(>>-) :: Last a -> (a -> Last b) -> Last b #

join :: Last (Last a) -> Last a #

FromJSON a => FromJSON (Last a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON a => ToJSON (Last a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

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 #

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 #

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 #

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 #

Default (Last a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Last a #

NFData a => NFData (Last a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Last a -> () #

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 #

FromHttpApiData a => FromHttpApiData (Last a) 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData a => ToHttpApiData (Last a) 
Instance details

Defined in Web.Internal.HttpApiData

Container (Last a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Last a) #

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 #

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 #

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)) #

safeMaximum :: Last a -> Maybe (Element (Last a)) #

safeMinimum :: Last a -> Maybe (Element (Last a)) #

safeFoldr1 :: (Element (Last a) -> Element (Last a) -> Element (Last a)) -> Last a -> Maybe (Element (Last a)) #

safeFoldl1 :: (Element (Last a) -> Element (Last a) -> Element (Last a)) -> Last a -> Maybe (Element (Last a)) #

Generic1 Last 
Instance details

Defined in Data.Monoid

Associated Types

type Rep1 Last :: k -> Type #

Methods

from1 :: forall (a :: k). Last a -> Rep1 Last a #

to1 :: forall (a :: k). 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)))

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"

Constructors

First 

Fields

Instances

Instances details
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 #

Foldable First

Since: base-4.8.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => First m -> m #

foldMap :: Monoid m => (a -> m) -> First a -> m #

foldMap' :: Monoid m => (a -> m) -> First a -> m #

foldr :: (a -> b -> b) -> b -> First a -> b #

foldr' :: (a -> b -> b) -> b -> First a -> b #

foldl :: (b -> a -> b) -> b -> First a -> b #

foldl' :: (b -> a -> b) -> b -> First a -> b #

foldr1 :: (a -> a -> a) -> First a -> a #

foldl1 :: (a -> a -> a) -> First a -> a #

toList :: First a -> [a] #

null :: First a -> Bool #

length :: First a -> Int #

elem :: Eq a => a -> First a -> Bool #

maximum :: Ord a => First a -> a #

minimum :: Ord a => First a -> a #

sum :: Num a => First a -> a #

product :: Num a => First a -> a #

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) #

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 #

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 #

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 #

NFData1 First

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> First a -> () #

Apply First 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(<.>) :: First (a -> b) -> First a -> First b #

(.>) :: First a -> First b -> First b #

(<.) :: First a -> First b -> First a #

liftF2 :: (a -> b -> c) -> First a -> First b -> First c #

Bind First 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(>>-) :: First a -> (a -> First b) -> First b #

join :: First (First a) -> First a #

FromJSON a => FromJSON (First a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON a => ToJSON (First a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

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 #

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 #

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 #

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 #

Default (First a) 
Instance details

Defined in Data.Default.Class

Methods

def :: First a #

NFData a => NFData (First a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: First a -> () #

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 #

FromHttpApiData a => FromHttpApiData (First a) 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData a => ToHttpApiData (First a) 
Instance details

Defined in Web.Internal.HttpApiData

Container (First a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (First a) #

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 #

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 #

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)) #

safeMaximum :: First a -> Maybe (Element (First a)) #

safeMinimum :: First a -> Maybe (Element (First a)) #

safeFoldr1 :: (Element (First a) -> Element (First a) -> Element (First a)) -> First a -> Maybe (Element (First a)) #

safeFoldl1 :: (Element (First a) -> Element (First a) -> Element (First a)) -> First a -> Maybe (Element (First a)) #

Generic1 First 
Instance details

Defined in Data.Monoid

Associated Types

type Rep1 First :: k -> Type #

Methods

from1 :: forall (a :: k). First a -> Rep1 First a #

to1 :: forall (a :: k). 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 Sum a #

Monoid under addition.

>>> getSum (Sum 1 <> Sum 2 <> mempty)
3

Constructors

Sum 

Fields

Instances

Instances details
Representable Sum 
Instance details

Defined in Data.Functor.Rep

Associated Types

type Rep Sum #

Methods

tabulate :: (Rep Sum -> a) -> Sum a #

index :: Sum a -> Rep 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 #

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) #

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 #

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 #

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 #

NFData1 Sum

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> Sum a -> () #

Apply Sum 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(<.>) :: Sum (a -> b) -> Sum a -> Sum b #

(.>) :: Sum a -> Sum b -> Sum b #

(<.) :: Sum a -> Sum b -> Sum a #

liftF2 :: (a -> b -> c) -> Sum a -> Sum b -> Sum c #

Bind Sum 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(>>-) :: Sum a -> (a -> Sum b) -> Sum b #

join :: Sum (Sum a) -> 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 #

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)) #

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 => 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 #

Bounded a => Bounded (Sum a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

minBound :: Sum a #

maxBound :: Sum 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 #

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 #

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 #

Num a => Default (Sum a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Sum a #

NFData a => NFData (Sum a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: 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 #

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 #

FromHttpApiData a => FromHttpApiData (Sum a) 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData a => ToHttpApiData (Sum a) 
Instance details

Defined in Web.Internal.HttpApiData

Prim a => Prim (Sum a)

Since: primitive-0.6.5.0

Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: Sum a -> Int# #

alignment# :: Sum a -> Int# #

indexByteArray# :: ByteArray# -> Int# -> Sum a #

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, Sum a #) #

writeByteArray# :: MutableByteArray# s -> Int# -> Sum a -> State# s -> State# s #

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> Sum a -> State# s -> State# s #

indexOffAddr# :: Addr# -> Int# -> Sum a #

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, Sum a #) #

writeOffAddr# :: Addr# -> Int# -> Sum a -> State# s -> State# s #

setOffAddr# :: Addr# -> Int# -> Int# -> Sum a -> State# s -> State# s #

Container (Sum a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Sum a) #

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 #

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 #

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)) #

safeMaximum :: Sum a -> Maybe (Element (Sum a)) #

safeMinimum :: Sum a -> Maybe (Element (Sum a)) #

safeFoldr1 :: (Element (Sum a) -> Element (Sum a) -> Element (Sum a)) -> Sum a -> Maybe (Element (Sum a)) #

safeFoldl1 :: (Element (Sum a) -> Element (Sum a) -> Element (Sum a)) -> Sum a -> Maybe (Element (Sum a)) #

Unbox a => Unbox (Sum a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Generic1 Sum 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep1 Sum :: k -> Type #

Methods

from1 :: forall (a :: k). Sum a -> Rep1 Sum a #

to1 :: forall (a :: k). Rep1 Sum a -> Sum a #

type Rep Sum 
Instance details

Defined in Data.Functor.Rep

type Rep Sum = ()
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)))
type Element (Sum a) 
Instance details

Defined in Universum.Container.Class

type Element (Sum a) = ElementDefault (Sum a)
newtype Vector (Sum a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector (Sum a) = V_Sum (Vector 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

Instances details
Representable Product 
Instance details

Defined in Data.Functor.Rep

Associated Types

type Rep Product #

Methods

tabulate :: (Rep Product -> a) -> Product a #

index :: Product a -> Rep 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 #

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) #

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 #

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 #

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 #

NFData1 Product

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> Product a -> () #

Apply Product 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(<.>) :: Product (a -> b) -> Product a -> Product b #

(.>) :: Product a -> Product b -> Product b #

(<.) :: Product a -> Product b -> Product a #

liftF2 :: (a -> b -> c) -> Product a -> Product b -> Product c #

Bind Product 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(>>-) :: Product a -> (a -> Product b) -> Product b #

join :: Product (Product a) -> Product a #

Unbox a => Vector Vector (Product a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox a => MVector MVector (Product a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Num a => Monoid (Product a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

mempty :: Product a #

mappend :: Product a -> Product a -> Product a #

mconcat :: [Product a] -> Product a #

Num a => 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 #

Bounded a => Bounded (Product a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

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 => 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 #

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 #

Num a => Default (Product a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Product a #

NFData a => NFData (Product a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Product a -> () #

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 #

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 #

FromHttpApiData a => FromHttpApiData (Product a) 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData a => ToHttpApiData (Product a) 
Instance details

Defined in Web.Internal.HttpApiData

Prim a => Prim (Product a)

Since: primitive-0.6.5.0

Instance details

Defined in Data.Primitive.Types

Container (Product a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Product a) #

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 #

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 #

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)) #

safeMaximum :: Product a -> Maybe (Element (Product a)) #

safeMinimum :: Product a -> Maybe (Element (Product a)) #

safeFoldr1 :: (Element (Product a) -> Element (Product a) -> Element (Product a)) -> Product a -> Maybe (Element (Product a)) #

safeFoldl1 :: (Element (Product a) -> Element (Product a) -> Element (Product a)) -> Product a -> Maybe (Element (Product a)) #

Unbox a => Unbox (Product a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Generic1 Product 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep1 Product :: k -> Type #

Methods

from1 :: forall (a :: k). Product a -> Rep1 Product a #

to1 :: forall (a :: k). Rep1 Product a -> Product a #

type Rep Product 
Instance details

Defined in Data.Functor.Rep

type Rep Product = ()
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)))
type Element (Product a) 
Instance details

Defined in Universum.Container.Class

type Element (Product a) = ElementDefault (Product a)
newtype Vector (Product a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector (Product a) = V_Product (Vector 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 Endo a #

The monoid of endomorphisms under composition.

>>> let computation = Endo ("Hello, " ++) <> Endo (++ "!")
>>> appEndo computation "Haskell"
"Hello, Haskell!"

Constructors

Endo 

Fields

Instances

Instances details
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 #

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 #

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 #

Default (Endo a) 
Instance details

Defined in Data.Default.Class

Methods

def :: 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 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

Instances details
Representable Dual 
Instance details

Defined in Data.Functor.Rep

Associated Types

type Rep Dual #

Methods

tabulate :: (Rep Dual -> a) -> Dual a #

index :: Dual a -> Rep 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 #

Foldable Dual

Since: base-4.8.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Dual m -> m #

foldMap :: Monoid m => (a -> m) -> Dual a -> m #

foldMap' :: Monoid m => (a -> m) -> Dual a -> m #

foldr :: (a -> b -> b) -> b -> Dual a -> b #

foldr' :: (a -> b -> b) -> b -> Dual a -> b #

foldl :: (b -> a -> b) -> b -> Dual a -> b #

foldl' :: (b -> a -> b) -> b -> Dual a -> b #

foldr1 :: (a -> a -> a) -> Dual a -> a #

foldl1 :: (a -> a -> a) -> Dual a -> a #

toList :: Dual a -> [a] #

null :: Dual a -> Bool #

length :: Dual a -> Int #

elem :: Eq a => a -> Dual a -> Bool #

maximum :: Ord a => Dual a -> a #

minimum :: Ord a => Dual a -> a #

sum :: Num a => Dual a -> a #

product :: Num a => Dual a -> a #

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) #

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 #

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 #

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 #

NFData1 Dual

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> Dual a -> () #

Apply Dual 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(<.>) :: Dual (a -> b) -> Dual a -> Dual b #

(.>) :: Dual a -> Dual b -> Dual b #

(<.) :: Dual a -> Dual b -> Dual a #

liftF2 :: (a -> b -> c) -> Dual a -> Dual b -> Dual c #

Bind Dual 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(>>-) :: Dual a -> (a -> Dual b) -> Dual b #

join :: Dual (Dual a) -> 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 #

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)) #

FromJSON a => FromJSON (Dual a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON a => ToJSON (Dual a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

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 #

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 #

Bounded a => Bounded (Dual a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

minBound :: Dual a #

maxBound :: Dual 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 #

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 #

Default a => Default (Dual a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Dual a #

NFData a => NFData (Dual a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: 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 #

FromHttpApiData a => FromHttpApiData (Dual a) 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData a => ToHttpApiData (Dual a) 
Instance details

Defined in Web.Internal.HttpApiData

Prim a => Prim (Dual a)

Since: primitive-0.6.5.0

Instance details

Defined in Data.Primitive.Types

Container (Dual a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Dual a) #

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 #

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 #

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)) #

safeMaximum :: Dual a -> Maybe (Element (Dual a)) #

safeMinimum :: Dual a -> Maybe (Element (Dual a)) #

safeFoldr1 :: (Element (Dual a) -> Element (Dual a) -> Element (Dual a)) -> Dual a -> Maybe (Element (Dual a)) #

safeFoldl1 :: (Element (Dual a) -> Element (Dual a) -> Element (Dual a)) -> Dual a -> Maybe (Element (Dual a)) #

Unbox a => Unbox (Dual a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Generic1 Dual 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep1 Dual :: k -> Type #

Methods

from1 :: forall (a :: k). Dual a -> Rep1 Dual a #

to1 :: forall (a :: k). Rep1 Dual a -> Dual a #

type Rep Dual 
Instance details

Defined in Data.Functor.Rep

type Rep Dual = ()
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)))
type Element (Dual a) 
Instance details

Defined in Universum.Container.Class

type Element (Dual a) = ElementDefault (Dual a)
newtype Vector (Dual a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector (Dual a) = V_Dual (Vector 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 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

Instances details
Monoid Any

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

mempty :: Any #

mappend :: Any -> Any -> Any #

mconcat :: [Any] -> 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 #

Bounded Any

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

minBound :: Any #

maxBound :: Any #

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 #

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 #

Default Any 
Instance details

Defined in Data.Default.Class

Methods

def :: Any #

NFData Any

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: 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 #

FromHttpApiData Any 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Any 
Instance details

Defined in Web.Internal.HttpApiData

Unbox Any 
Instance details

Defined in Data.Vector.Unboxed.Base

Vector Vector Any 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Any 
Instance details

Defined in Data.Vector.Unboxed.Base

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 Alt (f :: k -> Type) (a :: k) #

Monoid under <|>.

>>> getAlt (Alt (Just 12) <> Alt (Just 24))
Just 12
>>> getAlt $ Alt Nothing <> Alt (Just 24)
Just 24

Since: base-4.8.0.0

Constructors

Alt 

Fields

Instances

Instances details
Generic1 (Alt f :: k -> Type) 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep1 (Alt f) :: k -> Type #

Methods

from1 :: forall (a :: k0). Alt f a -> Rep1 (Alt f) a #

to1 :: forall (a :: k0). Rep1 (Alt f) a -> 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 #

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)) #

Foldable f => Foldable (Alt f)

Since: base-4.12.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Alt f m -> m #

foldMap :: Monoid m => (a -> m) -> Alt f a -> m #

foldMap' :: Monoid m => (a -> m) -> Alt f a -> m #

foldr :: (a -> b -> b) -> b -> Alt f a -> b #

foldr' :: (a -> b -> b) -> b -> Alt f a -> b #

foldl :: (b -> a -> b) -> b -> Alt f a -> b #

foldl' :: (b -> a -> b) -> b -> Alt f a -> b #

foldr1 :: (a -> a -> a) -> Alt f a -> a #

foldl1 :: (a -> a -> a) -> Alt f a -> a #

toList :: Alt f a -> [a] #

null :: Alt f a -> Bool #

length :: Alt f a -> Int #

elem :: Eq a => a -> Alt f a -> Bool #

maximum :: Ord a => Alt f a -> a #

minimum :: Ord a => Alt f a -> a #

sum :: Num a => Alt f a -> a #

product :: Num a => Alt f a -> a #

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] #

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 #

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 #

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 #

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 #

Apply f => Apply (Alt f) 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(<.>) :: Alt f (a -> b) -> Alt f a -> Alt f b #

(.>) :: Alt f a -> Alt f b -> Alt f b #

(<.) :: Alt f a -> Alt f b -> Alt f a #

liftF2 :: (a -> b -> c) -> Alt f a -> Alt f b -> Alt f c #

Bind f => Bind (Alt f) 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(>>-) :: Alt f a -> (a -> Alt f b) -> Alt f b #

join :: Alt f (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 #

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 #

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] #

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 #

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 #

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 #

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 #

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 #

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))

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

Instances details
Monoid All

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

mempty :: All #

mappend :: All -> All -> All #

mconcat :: [All] -> 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 #

Bounded All

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

minBound :: All #

maxBound :: All #

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 #

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 #

Default All 
Instance details

Defined in Data.Default.Class

Methods

def :: All #

NFData All

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: 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 #

FromHttpApiData All 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData All 
Instance details

Defined in Web.Internal.HttpApiData

Unbox All 
Instance details

Defined in Data.Vector.Unboxed.Base

Vector Vector All 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector All 
Instance details

Defined in Data.Vector.Unboxed.Base

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)

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 \(\mathcal{O}(1)\) rather than \(\mathcal{O}(\log n)\).

newtype Down a #

The Down type allows you to reverse sort order conveniently. A value of type Down a contains a value of type a (represented as Down a).

If a has an Ord instance associated with it then comparing two values thus wrapped will give you the opposite of their normal sort order. This is particularly useful when sorting in generalised list comprehensions, as in: then sortWith by Down x.

>>> compare True False
GT
>>> compare (Down True) (Down False)
LT

If a has a Bounded instance then the wrapped instance also respects the reversed ordering by exchanging the values of minBound and maxBound.

>>> minBound :: Int
-9223372036854775808
>>> minBound :: Down Int
Down 9223372036854775807

All other instances of Down a behave as they do for a.

Since: base-4.6.0.0

Constructors

Down 

Fields

Instances

Instances details
Foldable Down

Since: base-4.12.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Down m -> m #

foldMap :: Monoid m => (a -> m) -> Down a -> m #

foldMap' :: Monoid m => (a -> m) -> Down a -> m #

foldr :: (a -> b -> b) -> b -> Down a -> b #

foldr' :: (a -> b -> b) -> b -> Down a -> b #

foldl :: (b -> a -> b) -> b -> Down a -> b #

foldl' :: (b -> a -> b) -> b -> Down a -> b #

foldr1 :: (a -> a -> a) -> Down a -> a #

foldl1 :: (a -> a -> a) -> Down a -> a #

toList :: Down a -> [a] #

null :: Down a -> Bool #

length :: Down a -> Int #

elem :: Eq a => a -> Down a -> Bool #

maximum :: Ord a => Down a -> a #

minimum :: Ord a => Down a -> a #

sum :: Num a => Down a -> a #

product :: Num a => Down a -> a #

Eq1 Down

Since: base-4.12.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftEq :: (a -> b -> Bool) -> Down a -> Down b -> Bool #

Ord1 Down

Since: base-4.12.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftCompare :: (a -> b -> Ordering) -> Down a -> Down b -> Ordering #

Read1 Down

Since: base-4.12.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (Down a) #

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [Down a] #

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (Down a) #

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [Down a] #

Show1 Down

Since: base-4.12.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Down a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Down a] -> ShowS #

Traversable Down

Since: base-4.12.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Down a -> f (Down b) #

sequenceA :: Applicative f => Down (f a) -> f (Down a) #

mapM :: Monad m => (a -> m b) -> Down a -> m (Down b) #

sequence :: Monad m => Down (m a) -> m (Down a) #

Applicative Down

Since: base-4.11.0.0

Instance details

Defined in Data.Ord

Methods

pure :: a -> Down a #

(<*>) :: Down (a -> b) -> Down a -> Down b #

liftA2 :: (a -> b -> c) -> Down a -> Down b -> Down c #

(*>) :: Down a -> Down b -> Down b #

(<*) :: Down a -> Down b -> Down a #

Functor Down

Since: base-4.11.0.0

Instance details

Defined in Data.Ord

Methods

fmap :: (a -> b) -> Down a -> Down b #

(<$) :: a -> Down b -> Down a #

Monad Down

Since: base-4.11.0.0

Instance details

Defined in Data.Ord

Methods

(>>=) :: Down a -> (a -> Down b) -> Down b #

(>>) :: Down a -> Down b -> Down b #

return :: a -> Down a #

NFData1 Down

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> Down a -> () #

Apply Down 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(<.>) :: Down (a -> b) -> Down a -> Down b #

(.>) :: Down a -> Down b -> Down b #

(<.) :: Down a -> Down b -> Down a #

liftF2 :: (a -> b -> c) -> Down a -> Down b -> Down c #

Bind Down 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(>>-) :: Down a -> (a -> Down b) -> Down b #

join :: Down (Down a) -> 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 #

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)) #

Bits a => Bits (Down a)

Since: base-4.14.0.0

Instance details

Defined in Data.Ord

Methods

(.&.) :: Down a -> Down a -> Down a #

(.|.) :: Down a -> Down a -> Down a #

xor :: Down a -> Down a -> Down a #

complement :: Down a -> Down a #

shift :: Down a -> Int -> Down a #

rotate :: Down a -> Int -> Down a #

zeroBits :: Down a #

bit :: Int -> Down a #

setBit :: Down a -> Int -> Down a #

clearBit :: Down a -> Int -> Down a #

complementBit :: Down a -> Int -> Down a #

testBit :: Down a -> Int -> Bool #

bitSizeMaybe :: Down a -> Maybe Int #

bitSize :: Down a -> Int #

isSigned :: Down a -> Bool #

shiftL :: Down a -> Int -> Down a #

unsafeShiftL :: Down a -> Int -> Down a #

shiftR :: Down a -> Int -> Down a #

unsafeShiftR :: Down a -> Int -> Down a #

rotateL :: Down a -> Int -> Down a #

rotateR :: Down a -> Int -> Down a #

popCount :: Down a -> Int #

FiniteBits a => FiniteBits (Down a)

Since: base-4.14.0.0

Instance details

Defined in Data.Ord

Storable a => Storable (Down a)

Since: base-4.14.0.0

Instance details

Defined in Data.Ord

Methods

sizeOf :: Down a -> Int #

alignment :: Down a -> Int #

peekElemOff :: Ptr (Down a) -> Int -> IO (Down a) #

pokeElemOff :: Ptr (Down a) -> Int -> Down a -> IO () #

peekByteOff :: Ptr b -> Int -> IO (Down a) #

pokeByteOff :: Ptr b -> Int -> Down a -> IO () #

peek :: Ptr (Down a) -> IO (Down a) #

poke :: Ptr (Down a) -> Down a -> IO () #

Monoid a => Monoid (Down a)

Since: base-4.11.0.0

Instance details

Defined in Data.Ord

Methods

mempty :: Down a #

mappend :: Down a -> Down a -> Down a #

mconcat :: [Down a] -> Down a #

Semigroup a => Semigroup (Down a)

Since: base-4.11.0.0

Instance details

Defined in Data.Ord

Methods

(<>) :: Down a -> Down a -> Down a #

sconcat :: NonEmpty (Down a) -> Down a #

stimes :: Integral b => b -> Down a -> Down a #

Bounded a => Bounded (Down a)

Swaps minBound and maxBound of the underlying type.

Since: base-4.14.0.0

Instance details

Defined in Data.Ord

Methods

minBound :: Down a #

maxBound :: Down a #

Floating a => Floating (Down a)

Since: base-4.14.0.0

Instance details

Defined in Data.Ord

Methods

pi :: Down a #

exp :: Down a -> Down a #

log :: Down a -> Down a #

sqrt :: Down a -> Down a #

(**) :: Down a -> Down a -> Down a #

logBase :: Down a -> Down a -> Down a #

sin :: Down a -> Down a #

cos :: Down a -> Down a #

tan :: Down a -> Down a #

asin :: Down a -> Down a #

acos :: Down a -> Down a #

atan :: Down a -> Down a #

sinh :: Down a -> Down a #

cosh :: Down a -> Down a #

tanh :: Down a -> Down a #

asinh :: Down a -> Down a #

acosh :: Down a -> Down a #

atanh :: Down a -> Down a #

log1p :: Down a -> Down a #

expm1 :: Down a -> Down a #

log1pexp :: Down a -> Down a #

log1mexp :: Down a -> Down a #

RealFloat a => RealFloat (Down a)

Since: base-4.14.0.0

Instance details

Defined in Data.Ord

Generic (Down a) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Down a) :: Type -> Type #

Methods

from :: Down a -> Rep (Down a) x #

to :: Rep (Down a) x -> Down a #

Ix a => Ix (Down a)

Since: base-4.14.0.0

Instance details

Defined in Data.Ord

Methods

range :: (Down a, Down a) -> [Down a] #

index :: (Down a, Down a) -> Down a -> Int #

unsafeIndex :: (Down a, Down a) -> Down a -> Int #

inRange :: (Down a, Down a) -> Down a -> Bool #

rangeSize :: (Down a, Down a) -> Int #

unsafeRangeSize :: (Down a, Down a) -> Int #

Num a => Num (Down a)

Since: base-4.11.0.0

Instance details

Defined in Data.Ord

Methods

(+) :: Down a -> Down a -> Down a #

(-) :: Down a -> Down a -> Down a #

(*) :: Down a -> Down a -> Down a #

negate :: Down a -> Down a #

abs :: Down a -> Down a #

signum :: Down a -> Down a #

fromInteger :: Integer -> Down a #

Read a => Read (Down a)

This instance would be equivalent to the derived instances of the Down newtype if the getDown field were removed

Since: base-4.7.0.0

Instance details

Defined in Data.Ord

Fractional a => Fractional (Down a)

Since: base-4.14.0.0

Instance details

Defined in Data.Ord

Methods

(/) :: Down a -> Down a -> Down a #

recip :: Down a -> Down a #

fromRational :: Rational -> Down a #

Real a => Real (Down a)

Since: base-4.14.0.0

Instance details

Defined in Data.Ord

Methods

toRational :: Down a -> Rational #

RealFrac a => RealFrac (Down a)

Since: base-4.14.0.0

Instance details

Defined in Data.Ord

Methods

properFraction :: Integral b => Down a -> (b, Down a) #

truncate :: Integral b => Down a -> b #

round :: Integral b => Down a -> b #

ceiling :: Integral b => Down a -> b #

floor :: Integral b => Down a -> b #

Show a => Show (Down a)

This instance would be equivalent to the derived instances of the Down newtype if the getDown field were removed

Since: base-4.7.0.0

Instance details

Defined in Data.Ord

Methods

showsPrec :: Int -> Down a -> ShowS #

show :: Down a -> String #

showList :: [Down a] -> ShowS #

NFData a => NFData (Down a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Down a -> () #

Eq a => Eq (Down a)

Since: base-4.6.0.0

Instance details

Defined in Data.Ord

Methods

(==) :: Down a -> Down a -> Bool #

(/=) :: Down a -> Down a -> Bool #

Ord a => Ord (Down a)

Since: base-4.6.0.0

Instance details

Defined in Data.Ord

Methods

compare :: Down a -> Down a -> Ordering #

(<) :: Down a -> Down a -> Bool #

(<=) :: Down a -> Down a -> Bool #

(>) :: Down a -> Down a -> Bool #

(>=) :: Down a -> Down a -> Bool #

max :: Down a -> Down a -> Down a #

min :: Down a -> Down a -> Down a #

Prim a => Prim (Down a)

Since: primitive-0.6.5.0

Instance details

Defined in Data.Primitive.Types

Unbox a => Unbox (Down a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Generic1 Down 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 Down :: k -> Type #

Methods

from1 :: forall (a :: k). Down a -> Rep1 Down a #

to1 :: forall (a :: k). Rep1 Down a -> Down a #

newtype MVector s (Down a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s (Down a) = MV_Down (MVector s a)
type Rep (Down a)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

type Rep (Down a) = D1 ('MetaData "Down" "Data.Ord" "base" 'True) (C1 ('MetaCons "Down" 'PrefixI 'True) (S1 ('MetaSel ('Just "getDown") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))
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

type Rep1 Down = D1 ('MetaData "Down" "Data.Ord" "base" 'True) (C1 ('MetaCons "Down" 'PrefixI 'True) (S1 ('MetaSel ('Just "getDown") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1))

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) ...

data SomeNat #

This type represents unknown type-level natural numbers.

Since: base-4.10.0.0

Constructors

KnownNat n => SomeNat (Proxy n) 

Instances

Instances details
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

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

someNatVal :: Natural -> SomeNat #

Convert an integer into an unknown type-level natural.

Since: base-4.10.0.0

natVal :: forall (n :: Nat) proxy. KnownNat n => proxy n -> Natural #

Since: base-4.10.0.0

reads :: Read a => ReadS a #

equivalent to readsPrec with a precedence of 0.

readMaybe :: Read a => String -> Maybe a #

Parse a string using the Read instance. Succeeds if there is exactly one valid result.

>>> readMaybe "123" :: Maybe Int
Just 123
>>> readMaybe "hello" :: Maybe Int
Nothing

Since: base-4.6.0.0

rights :: [Either a b] -> [b] #

Extracts from a list of Either all the Right elements. All the Right elements are extracted in order.

Examples

Expand

Basic usage:

>>> let list = [ Left "foo", Right 3, Left "bar", Right 7, Left "baz" ]
>>> rights list
[3,7]

partitionEithers :: [Either a b] -> ([a], [b]) #

Partitions a list of Either into two lists. All the Left elements are extracted, in order, to the first component of the output. Similarly the Right elements are extracted to the second component of the output.

Examples

Expand

Basic usage:

>>> let list = [ Left "foo", Right 3, Left "bar", Right 7, Left "baz" ]
>>> partitionEithers list
(["foo","bar","baz"],[3,7])

The pair returned by partitionEithers x should be the same pair as (lefts x, rights x):

>>> let list = [ Left "foo", Right 3, Left "bar", Right 7, Left "baz" ]
>>> partitionEithers list == (lefts list, rights list)
True

lefts :: [Either a b] -> [a] #

Extracts from a list of Either all the Left elements. All the Left elements are extracted in order.

Examples

Expand

Basic usage:

>>> let list = [ Left "foo", Right 3, Left "bar", Right 7, Left "baz" ]
>>> lefts list
["foo","bar","baz"]

isRight :: Either a b -> Bool #

Return True if the given value is a Right-value, False otherwise.

Examples

Expand

Basic usage:

>>> isRight (Left "foo")
False
>>> isRight (Right 3)
True

Assuming a Left value signifies some sort of error, we can use isRight to write a very simple reporting function that only outputs "SUCCESS" when a computation has succeeded.

This example shows how isRight might be used to avoid pattern matching when one does not care about the value contained in the constructor:

>>> import Control.Monad ( when )
>>> let report e = when (isRight e) $ putStrLn "SUCCESS"
>>> report (Left "parse error")
>>> report (Right 1)
SUCCESS

Since: base-4.7.0.0

isLeft :: Either a b -> Bool #

Return True if the given value is a Left-value, False otherwise.

Examples

Expand

Basic usage:

>>> isLeft (Left "foo")
True
>>> isLeft (Right 3)
False

Assuming a Left value signifies some sort of error, we can use isLeft to write a very simple error-reporting function that does absolutely nothing in the case of success, and outputs "ERROR" if any error occurred.

This example shows how isLeft might be used to avoid pattern matching when one does not care about the value contained in the constructor:

>>> import Control.Monad ( when )
>>> let report e = when (isLeft e) $ putStrLn "ERROR"
>>> report (Right 1)
>>> report (Left "parse error")
ERROR

Since: base-4.7.0.0

data Proxy (t :: k) #

Proxy is a type that holds no data, but has a phantom parameter of arbitrary type (or even kind). Its use is to provide type information, even though there is no value available of that type (or it may be too costly to create one).

Historically, Proxy :: Proxy a is a safer alternative to the undefined :: a idiom.

>>> Proxy :: Proxy (Void, Int -> Int)
Proxy

Proxy can even hold types of higher kinds,

>>> Proxy :: Proxy Either
Proxy
>>> Proxy :: Proxy Functor
Proxy
>>> Proxy :: Proxy complicatedStructure
Proxy

Constructors

Proxy 

Instances

Instances details
Generic1 (Proxy :: k -> Type) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 Proxy :: k -> Type #

Methods

from1 :: forall (a :: k0). Proxy a -> Rep1 Proxy a #

to1 :: forall (a :: k0). Rep1 Proxy a -> Proxy a #

Representable (Proxy :: Type -> Type) 
Instance details

Defined in Data.Functor.Rep

Associated Types

type Rep Proxy #

Methods

tabulate :: (Rep Proxy -> a) -> Proxy a #

index :: Proxy a -> Rep Proxy -> a #

FromJSON1 (Proxy :: Type -> Type) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (Proxy a) #

liftParseJSONList :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [Proxy a] #

ToJSON1 (Proxy :: Type -> Type) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Value) -> ([a] -> Value) -> Proxy a -> Value #

liftToJSONList :: (a -> Value) -> ([a] -> Value) -> [Proxy a] -> Value #

liftToEncoding :: (a -> Encoding) -> ([a] -> Encoding) -> Proxy a -> Encoding #

liftToEncodingList :: (a -> Encoding) -> ([a] -> Encoding) -> [Proxy a] -> Encoding #

Foldable (Proxy :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Proxy m -> m #

foldMap :: Monoid m => (a -> m) -> Proxy a -> m #

foldMap' :: Monoid m => (a -> m) -> Proxy a -> m #

foldr :: (a -> b -> b) -> b -> Proxy a -> b #

foldr' :: (a -> b -> b) -> b -> Proxy a -> b #

foldl :: (b -> a -> b) -> b -> Proxy a -> b #

foldl' :: (b -> a -> b) -> b -> Proxy a -> b #

foldr1 :: (a -> a -> a) -> Proxy a -> a #

foldl1 :: (a -> a -> a) -> Proxy a -> a #

toList :: Proxy a -> [a] #

null :: Proxy a -> Bool #

length :: Proxy a -> Int #

elem :: Eq a => a -> Proxy a -> Bool #

maximum :: Ord a => Proxy a -> a #

minimum :: Ord a => Proxy a -> a #

sum :: Num a => Proxy a -> a #

product :: Num a => Proxy a -> a #

Eq1 (Proxy :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftEq :: (a -> b -> Bool) -> Proxy a -> Proxy b -> Bool #

Ord1 (Proxy :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftCompare :: (a -> b -> Ordering) -> Proxy a -> Proxy b -> Ordering #

Read1 (Proxy :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (Proxy a) #

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [Proxy a] #

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (Proxy a) #

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [Proxy a] #

Show1 (Proxy :: Type -> 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 #

Traversable (Proxy :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Proxy a -> f (Proxy b) #

sequenceA :: Applicative f => Proxy (f a) -> f (Proxy a) #

mapM :: Monad m => (a -> m b) -> Proxy a -> m (Proxy b) #

sequence :: Monad m => Proxy (m a) -> m (Proxy a) #

Alternative (Proxy :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Proxy

Methods

empty :: Proxy a #

(<|>) :: Proxy a -> Proxy a -> Proxy a #

some :: Proxy a -> Proxy [a] #

many :: Proxy a -> Proxy [a] #

Applicative (Proxy :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

pure :: a -> Proxy a #

(<*>) :: Proxy (a -> b) -> Proxy a -> Proxy b #

liftA2 :: (a -> b -> c) -> Proxy a -> Proxy b -> Proxy c #

(*>) :: Proxy a -> Proxy b -> Proxy b #

(<*) :: Proxy a -> Proxy b -> Proxy a #

Functor (Proxy :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

fmap :: (a -> b) -> Proxy a -> Proxy b #

(<$) :: a -> Proxy b -> Proxy a #

Monad (Proxy :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

(>>=) :: Proxy a -> (a -> Proxy b) -> Proxy b #

(>>) :: Proxy a -> Proxy b -> Proxy b #

return :: a -> Proxy a #

MonadPlus (Proxy :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Proxy

Methods

mzero :: Proxy a #

mplus :: Proxy a -> Proxy a -> Proxy a #

NFData1 (Proxy :: Type -> Type)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> Proxy a -> () #

Hashable1 (Proxy :: Type -> Type) 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> Proxy a -> Int #

Adjustable (Proxy :: Type -> Type) 
Instance details

Defined in Data.Key

Methods

adjust :: (a -> a) -> Key Proxy -> Proxy a -> Proxy a #

replace :: Key Proxy -> a -> Proxy a -> Proxy a #

FoldableWithKey (Proxy :: Type -> Type) 
Instance details

Defined in Data.Key

Methods

toKeyedList :: Proxy a -> [(Key Proxy, a)] #

foldMapWithKey :: Monoid m => (Key Proxy -> a -> m) -> Proxy a -> m #

foldrWithKey :: (Key Proxy -> a -> b -> b) -> b -> Proxy a -> b #

foldlWithKey :: (b -> Key Proxy -> a -> b) -> b -> Proxy a -> b #

Indexable (Proxy :: Type -> Type) 
Instance details

Defined in Data.Key

Methods

index :: Proxy a -> Key Proxy -> a #

Keyed (Proxy :: Type -> Type) 
Instance details

Defined in Data.Key

Methods

mapWithKey :: (Key Proxy -> a -> b) -> Proxy a -> Proxy b #

Lookup (Proxy :: Type -> Type) 
Instance details

Defined in Data.Key

Methods

lookup :: Key Proxy -> Proxy a -> Maybe a #

TraversableWithKey (Proxy :: Type -> Type) 
Instance details

Defined in Data.Key

Methods

traverseWithKey :: Applicative f => (Key Proxy -> a -> f b) -> Proxy a -> f (Proxy b) #

mapWithKeyM :: Monad m => (Key Proxy -> a -> m b) -> Proxy a -> m (Proxy b) #

Zip (Proxy :: Type -> Type) 
Instance details

Defined in Data.Key

Methods

zipWith :: (a -> b -> c) -> Proxy a -> Proxy b -> Proxy c #

zip :: Proxy a -> Proxy b -> Proxy (a, b) #

zap :: Proxy (a -> b) -> Proxy a -> Proxy b #

ZipWithKey (Proxy :: Type -> Type) 
Instance details

Defined in Data.Key

Methods

zipWithKey :: (Key Proxy -> a -> b -> c) -> Proxy a -> Proxy b -> Proxy c #

zapWithKey :: Proxy (Key Proxy -> a -> b) -> Proxy a -> Proxy b #

Apply (Proxy :: Type -> Type) 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(<.>) :: Proxy (a -> b) -> Proxy a -> Proxy b #

(.>) :: Proxy a -> Proxy b -> Proxy b #

(<.) :: Proxy a -> Proxy b -> Proxy a #

liftF2 :: (a -> b -> c) -> Proxy a -> Proxy b -> Proxy c #

Bind (Proxy :: Type -> Type) 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(>>-) :: Proxy a -> (a -> Proxy b) -> Proxy b #

join :: Proxy (Proxy a) -> Proxy a #

FromJSON (Proxy a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON (Proxy a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Monoid (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

mempty :: Proxy s #

mappend :: Proxy s -> Proxy s -> Proxy s #

mconcat :: [Proxy s] -> Proxy s #

Semigroup (Proxy s)

Since: base-4.9.0.0

Instance details

Defined in Data.Proxy

Methods

(<>) :: Proxy s -> Proxy s -> Proxy s #

sconcat :: NonEmpty (Proxy s) -> Proxy s #

stimes :: Integral b => b -> Proxy s -> Proxy s #

Bounded (Proxy t)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

minBound :: Proxy t #

maxBound :: Proxy t #

Enum (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

succ :: Proxy s -> Proxy s #

pred :: Proxy s -> Proxy s #

toEnum :: Int -> Proxy s #

fromEnum :: Proxy s -> Int #

enumFrom :: Proxy s -> [Proxy s] #

enumFromThen :: Proxy s -> Proxy s -> [Proxy s] #

enumFromTo :: Proxy s -> Proxy s -> [Proxy s] #

enumFromThenTo :: Proxy s -> Proxy s -> Proxy s -> [Proxy s] #

Generic (Proxy t) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Proxy t) :: Type -> Type #

Methods

from :: Proxy t -> Rep (Proxy t) x #

to :: Rep (Proxy t) x -> Proxy t #

Ix (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

range :: (Proxy s, Proxy s) -> [Proxy s] #

index :: (Proxy s, Proxy s) -> Proxy s -> Int #

unsafeIndex :: (Proxy s, Proxy s) -> Proxy s -> Int #

inRange :: (Proxy s, Proxy s) -> Proxy s -> Bool #

rangeSize :: (Proxy s, Proxy s) -> Int #

unsafeRangeSize :: (Proxy s, Proxy s) -> Int #

Read (Proxy t)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Show (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

showsPrec :: Int -> Proxy s -> ShowS #

show :: Proxy s -> String #

showList :: [Proxy s] -> ShowS #

NFData (Proxy a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Proxy a -> () #

Eq (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

(==) :: Proxy s -> Proxy s -> Bool #

(/=) :: Proxy s -> Proxy s -> Bool #

Ord (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

compare :: Proxy s -> Proxy s -> Ordering #

(<) :: Proxy s -> Proxy s -> Bool #

(<=) :: Proxy s -> Proxy s -> Bool #

(>) :: Proxy s -> Proxy s -> Bool #

(>=) :: Proxy s -> Proxy s -> Bool #

max :: Proxy s -> Proxy s -> Proxy s #

min :: Proxy s -> Proxy s -> Proxy s #

Hashable (Proxy a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Proxy a -> Int #

hash :: Proxy a -> Int #

MonoFoldable (Proxy a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (Proxy a) -> m) -> Proxy a -> m #

ofoldr :: (Element (Proxy a) -> b -> b) -> b -> Proxy a -> b #

ofoldl' :: (a0 -> Element (Proxy a) -> a0) -> a0 -> Proxy a -> a0 #

otoList :: Proxy a -> [Element (Proxy a)] #

oall :: (Element (Proxy a) -> Bool) -> Proxy a -> Bool #

oany :: (Element (Proxy a) -> Bool) -> Proxy a -> Bool #

onull :: Proxy a -> Bool #

olength :: Proxy a -> Int #

olength64 :: Proxy a -> Int64 #

ocompareLength :: Integral i => Proxy a -> i -> Ordering #

otraverse_ :: Applicative f => (Element (Proxy a) -> f b) -> Proxy a -> f () #

ofor_ :: Applicative f => Proxy a -> (Element (Proxy a) -> f b) -> f () #

omapM_ :: Applicative m => (Element (Proxy a) -> m ()) -> Proxy a -> m () #

oforM_ :: Applicative m => Proxy a -> (Element (Proxy a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (Proxy a) -> m a0) -> a0 -> Proxy a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (Proxy a) -> m) -> Proxy a -> m #

ofoldr1Ex :: (Element (Proxy a) -> Element (Proxy a) -> Element (Proxy a)) -> Proxy a -> Element (Proxy a) #

ofoldl1Ex' :: (Element (Proxy a) -> Element (Proxy a) -> Element (Proxy a)) -> Proxy a -> Element (Proxy a) #

headEx :: Proxy a -> Element (Proxy a) #

lastEx :: Proxy a -> Element (Proxy a) #

unsafeHead :: Proxy a -> Element (Proxy a) #

unsafeLast :: Proxy a -> Element (Proxy a) #

maximumByEx :: (Element (Proxy a) -> Element (Proxy a) -> Ordering) -> Proxy a -> Element (Proxy a) #

minimumByEx :: (Element (Proxy a) -> Element (Proxy a) -> Ordering) -> Proxy a -> Element (Proxy a) #

oelem :: Element (Proxy a) -> Proxy a -> Bool #

onotElem :: Element (Proxy a) -> Proxy a -> Bool #

MonoFunctor (Proxy a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Proxy a) -> Element (Proxy a)) -> Proxy a -> Proxy a #

MonoPointed (Proxy a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Proxy a) -> Proxy a #

MonoTraversable (Proxy a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (Proxy a) -> f (Element (Proxy a))) -> Proxy a -> f (Proxy a) #

omapM :: Applicative m => (Element (Proxy a) -> m (Element (Proxy a))) -> Proxy a -> m (Proxy a) #

type Rep1 (Proxy :: k -> Type)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

type Rep1 (Proxy :: k -> Type) = D1 ('MetaData "Proxy" "Data.Proxy" "base" 'False) (C1 ('MetaCons "Proxy" 'PrefixI 'False) (U1 :: k -> Type))
type Rep (Proxy :: Type -> Type) 
Instance details

Defined in Data.Functor.Rep

type Rep (Proxy :: Type -> Type) = Void
type Key (Proxy :: Type -> Type) 
Instance details

Defined in Data.Key

type Key (Proxy :: Type -> Type) = Void
type Rep (Proxy t)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

type Rep (Proxy t) = D1 ('MetaData "Proxy" "Data.Proxy" "base" 'False) (C1 ('MetaCons "Proxy" 'PrefixI 'False) (U1 :: Type -> Type))
type Element (Proxy a) 
Instance details

Defined in Data.MonoTraversable

type Element (Proxy a) = a

type family (a :: k) == (b :: k) :: Bool where ... infix 4 #

A type family to compute Boolean equality.

Equations

(f a :: k2) == (g b :: k2) = (f == g) && (a == b) 
(a :: k) == (a :: k) = 'True 
(_1 :: k) == (_2 :: k) = 'False 

data IOMode #

Instances

Instances details
Enum IOMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.IOMode

Ix IOMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.IOMode

Read IOMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.IOMode

Show IOMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.IOMode

Eq IOMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.IOMode

Methods

(==) :: IOMode -> IOMode -> Bool #

(/=) :: IOMode -> IOMode -> Bool #

Ord IOMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.IOMode

byteSwap64 :: Word64 -> Word64 #

Reverse order of bytes in Word64.

Since: base-4.7.0.0

byteSwap32 :: Word32 -> Word32 #

Reverse order of bytes in Word32.

Since: base-4.7.0.0

byteSwap16 :: Word16 -> Word16 #

Reverse order of bytes in Word16.

Since: base-4.7.0.0

xor :: Bits a => a -> a -> a infixl 6 #

Bitwise "xor"

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.

odd :: Integral a => a -> Bool #

numericEnumFromTo :: (Ord a, Fractional a) => a -> a -> [a] #

numericEnumFromThenTo :: (Ord a, Fractional a) => a -> a -> a -> [a] #

numericEnumFromThen :: Fractional a => a -> a -> [a] #

numericEnumFrom :: Fractional a => a -> [a] #

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.

naturalFromInt :: Int -> Natural #

Convert an Int into a Natural, throwing an underflow exception for negative values.

lcm :: Integral a => a -> a -> a #

lcm x y is the smallest positive integer that both x and y divide.

integralEnumFromTo :: Integral a => a -> a -> [a] #

integralEnumFromThenTo :: Integral a => a -> a -> a -> [a] #

integralEnumFromThen :: (Integral a, Bounded a) => a -> a -> [a] #

integralEnumFrom :: (Integral a, Bounded a) => a -> [a] #

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.

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.

(^^) :: (Fractional a, Integral b) => a -> b -> a infixr 8 #

raise a number to an integral power

(^%^) :: Integral a => Rational -> a -> Rational #

(^) :: (Num a, Integral b) => a -> b -> a infixr 8 #

raise a number to a non-negative integral power

(%) :: Integral a => a -> a -> Ratio a infixl 7 #

Forms the ratio of two integral numbers.

boundedEnumFromThen :: (Enum a, Bounded a) => a -> a -> [a] #

boundedEnumFrom :: (Enum a, Bounded a) => a -> [a] #

chr :: Int -> Char #

The toEnum method restricted to the type Char.

zipWith :: (a -> b -> c) -> [a] -> [b] -> [c] #

\(\mathcal{O}(\min(m,n))\). zipWith generalises zip by zipping with the function given as the first argument, instead of a tupling function.

zipWith (,) xs ys == zip xs ys
zipWith f [x1,x2,x3..] [y1,y2,y3..] == [f x1 y1, f x2 y2, f x3 y3..]

For example, zipWith (+) is applied to two lists to produce the list of corresponding sums:

>>> zipWith (+) [1, 2, 3] [4, 5, 6]
[5,7,9]

zipWith is right-lazy:

>>> zipWith f [] _|_
[]

zipWith is capable of list fusion, but it is restricted to its first list argument and its resulting list.

zip3 :: [a] -> [b] -> [c] -> [(a, b, c)] #

zip3 takes three lists and returns a list of triples, analogous to zip. It is capable of list fusion, but it is restricted to its first list argument and its resulting list.

unzip3 :: [(a, b, c)] -> ([a], [b], [c]) #

The unzip3 function takes a list of triples and returns three lists, analogous to unzip.

>>> unzip3 []
([],[],[])
>>> unzip3 [(1, 'a', True), (2, 'b', False)]
([1,2],"ab",[True,False])

unzip :: [(a, b)] -> ([a], [b]) #

unzip transforms a list of pairs into a list of first components and a list of second components.

>>> unzip []
([],[])
>>> unzip [(1, 'a'), (2, 'b')]
([1,2],"ab")

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]
[]

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.

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.

scanr :: (a -> b -> b) -> b -> [a] -> [b] #

\(\mathcal{O}(n)\). scanr is the right-to-left dual of scanl. Note that the order of parameters on the accumulating function are reversed compared to scanl. Also note that

head (scanr f z xs) == foldr f z xs.
>>> scanr (+) 0 [1..4]
[10,9,7,4,0]
>>> scanr (+) 42 []
[42]
>>> scanr (-) 100 [1..4]
[98,-97,99,-96,100]
>>> scanr (\nextChar reversedString -> nextChar : reversedString) "foo" ['a', 'b', 'c', 'd']
["abcdfoo","bcdfoo","cdfoo","dfoo","foo"]
>>> force $ scanr (+) 0 [1..]
*** Exception: stack overflow

scanl :: (b -> a -> b) -> b -> [a] -> [b] #

\(\mathcal{O}(n)\). 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
>>> scanl (+) 0 [1..4]
[0,1,3,6,10]
>>> scanl (+) 42 []
[42]
>>> scanl (-) 100 [1..4]
[100,99,97,94,90]
>>> scanl (\reversedString nextChar -> nextChar : reversedString) "foo" ['a', 'b', 'c', 'd']
["foo","afoo","bafoo","cbafoo","dcbafoo"]
>>> scanl (+) 0 [1..]
* Hangs forever *

reverse :: [a] -> [a] #

reverse xs returns the elements of xs in reverse order. xs must be finite.

>>> reverse []
[]
>>> reverse [42]
[42]
>>> reverse [2,5,7]
[7,5,2]
>>> reverse [1..]
* Hangs forever *

replicate :: Int -> a -> [a] #

replicate n x is a list of length n with x the value of every element. It is an instance of the more general genericReplicate, in which n may be of any integral type.

>>> replicate 0 True
[]
>>> replicate (-1) True
[]
>>> replicate 4 True
[True,True,True,True]

repeat :: a -> [a] #

repeat x is an infinite list, with x the value of every element.

>>> take 20 $ repeat 17
[17,17,17,17,17,17,17,17,17...

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.

>>> take 10 $ iterate not True
[True,False,True,False...
>>> take 10 $ iterate (+3) 42
[42,45,48,51,54,57,60,63...

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]

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.

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.

>>> cycle []
*** Exception: Prelude.cycle: empty list
>>> take 20 $ cycle [42]
[42,42,42,42,42,42,42,42,42,42...
>>> take 20 $ cycle [2, 5, 7]
[2,5,7,2,5,7,2,5,7,2,5,7...

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).

maybeToList :: Maybe a -> [a] #

The maybeToList function returns an empty list when given Nothing or a singleton list when given Just.

Examples

Expand

Basic usage:

>>> maybeToList (Just 7)
[7]
>>> maybeToList Nothing
[]

One can use maybeToList to avoid pattern matching when combined with a function that (safely) works on lists:

>>> import Text.Read ( readMaybe )
>>> sum $ maybeToList (readMaybe "3")
3
>>> sum $ maybeToList (readMaybe "")
0

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
""

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]

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]

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

fromMaybe :: a -> Maybe a -> a #

The fromMaybe function takes a default value and a Maybe value. If the Maybe is Nothing, it returns the default value; otherwise, it returns the value contained in the Maybe.

Examples

Expand

Basic usage:

>>> fromMaybe "" (Just "Hello, World!")
"Hello, World!"
>>> fromMaybe "" Nothing
""

Read an integer from a string using readMaybe. If we fail to parse an integer, we want to return 0 by default:

>>> import Text.Read ( readMaybe )
>>> fromMaybe 0 (readMaybe "5")
5
>>> fromMaybe 0 (readMaybe "")
0

fromJust :: HasCallStack => Maybe a -> a #

The fromJust function extracts the element out of a Just and throws an error if its argument is Nothing.

Examples

Expand

Basic usage:

>>> fromJust (Just 1)
1
>>> 2 * (fromJust (Just 10))
20
>>> 2 * (fromJust Nothing)
*** Exception: Maybe.fromJust: Nothing

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]

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

fix :: (a -> a) -> a #

fix f is the least fixed point of the function f, i.e. the least defined x such that f x = x.

For example, we can write the factorial function using direct recursion as

>>> let fac n = if n <= 1 then 1 else n * fac (n-1) in fac 5
120

This uses the fact that Haskell’s let introduces recursive bindings. We can rewrite this definition using fix,

>>> fix (\rec n -> if n <= 1 then 1 else n * rec (n-1)) 5
120

Instead of making a recursive call, we introduce a dummy parameter rec; when used within fix, this parameter then refers to fix’s argument, hence the recursion is reintroduced.

(&) :: 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

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 -> (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 => 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

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

Instances details
NFData1 MVar

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> MVar a -> () #

NFData (MVar a)

NOTE: Only strict in the reference and not the referenced value.

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: MVar a -> () #

Eq (MVar a)

Since: base-4.1.0.0

Instance details

Defined in GHC.MVar

Methods

(==) :: MVar a -> MVar a -> Bool #

(/=) :: MVar a -> MVar a -> Bool #

PrimUnlifted (MVar a) 
Instance details

Defined in Data.Primitive.Unlifted.Class

Associated Types

type Unlifted (MVar a) :: TYPE UnliftedRep #

type Unlifted (MVar a) 
Instance details

Defined in Data.Primitive.Unlifted.Class

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

data NonEmpty a #

Non-empty (and non-strict) list type.

Since: base-4.9.0.0

Constructors

a :| [a] infixr 5 

Instances

Instances details
FromJSON1 NonEmpty 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (NonEmpty a) #

liftParseJSONList :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [NonEmpty a] #

ToJSON1 NonEmpty 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Value) -> ([a] -> Value) -> NonEmpty a -> Value #

liftToJSONList :: (a -> Value) -> ([a] -> Value) -> [NonEmpty a] -> Value #

liftToEncoding :: (a -> Encoding) -> ([a] -> Encoding) -> NonEmpty a -> Encoding #

liftToEncodingList :: (a -> Encoding) -> ([a] -> Encoding) -> [NonEmpty a] -> Encoding #

Foldable NonEmpty

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => NonEmpty m -> m #

foldMap :: Monoid m => (a -> m) -> NonEmpty a -> m #

foldMap' :: Monoid m => (a -> m) -> NonEmpty a -> m #

foldr :: (a -> b -> b) -> b -> NonEmpty a -> b #

foldr' :: (a -> b -> b) -> b -> NonEmpty a -> b #

foldl :: (b -> a -> b) -> b -> NonEmpty a -> b #

foldl' :: (b -> a -> b) -> b -> NonEmpty a -> b #

foldr1 :: (a -> a -> a) -> NonEmpty a -> a #

foldl1 :: (a -> a -> a) -> NonEmpty a -> a #

toList :: NonEmpty a -> [a] #

null :: NonEmpty a -> Bool #

length :: NonEmpty a -> Int #

elem :: Eq a => a -> NonEmpty a -> Bool #

maximum :: Ord a => NonEmpty a -> a #

minimum :: Ord a => NonEmpty a -> a #

sum :: Num a => NonEmpty a -> a #

product :: Num a => NonEmpty a -> a #

Eq1 NonEmpty

Since: base-4.10.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftEq :: (a -> b -> Bool) -> NonEmpty a -> NonEmpty b -> Bool #

Ord1 NonEmpty

Since: base-4.10.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftCompare :: (a -> b -> Ordering) -> NonEmpty a -> NonEmpty b -> Ordering #

Read1 NonEmpty

Since: base-4.10.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (NonEmpty a) #

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [NonEmpty a] #

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (NonEmpty a) #

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [NonEmpty a] #

Show1 NonEmpty

Since: base-4.10.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> NonEmpty a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [NonEmpty a] -> ShowS #

Traversable NonEmpty

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> NonEmpty a -> f (NonEmpty b) #

sequenceA :: Applicative f => NonEmpty (f a) -> f (NonEmpty a) #

mapM :: Monad m => (a -> m b) -> NonEmpty a -> m (NonEmpty b) #

sequence :: Monad m => NonEmpty (m a) -> m (NonEmpty a) #

Applicative NonEmpty

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

pure :: a -> NonEmpty a #

(<*>) :: NonEmpty (a -> b) -> NonEmpty a -> NonEmpty b #

liftA2 :: (a -> b -> c) -> NonEmpty a -> NonEmpty b -> NonEmpty c #

(*>) :: NonEmpty a -> NonEmpty b -> NonEmpty b #

(<*) :: NonEmpty a -> NonEmpty b -> NonEmpty a #

Functor NonEmpty

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

fmap :: (a -> b) -> NonEmpty a -> NonEmpty b #

(<$) :: a -> NonEmpty b -> NonEmpty a #

Monad NonEmpty

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

(>>=) :: NonEmpty a -> (a -> NonEmpty b) -> NonEmpty b #

(>>) :: NonEmpty a -> NonEmpty b -> NonEmpty b #

return :: a -> NonEmpty a #

Zip NonEmpty 
Instance details

Defined in Data.ChunkedZip

Methods

zipWith :: (a -> b -> c) -> NonEmpty a -> NonEmpty b -> NonEmpty c #

zip :: NonEmpty a -> NonEmpty b -> NonEmpty (a, b) #

zap :: NonEmpty (a -> b) -> NonEmpty a -> NonEmpty b #

unzip :: NonEmpty (a, b) -> (NonEmpty a, NonEmpty b) #

Comonad NonEmpty 
Instance details

Defined in Control.Comonad

Methods

extract :: NonEmpty a -> a #

duplicate :: NonEmpty a -> NonEmpty (NonEmpty a) #

extend :: (NonEmpty a -> b) -> NonEmpty a -> NonEmpty b #

ComonadApply NonEmpty 
Instance details

Defined in Control.Comonad

Methods

(<@>) :: NonEmpty (a -> b) -> NonEmpty a -> NonEmpty b #

(@>) :: NonEmpty a -> NonEmpty b -> NonEmpty b #

(<@) :: NonEmpty a -> NonEmpty b -> NonEmpty a #

NFData1 NonEmpty

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> NonEmpty a -> () #

Hashable1 NonEmpty

Since: hashable-1.3.1.0

Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> NonEmpty a -> Int #

Adjustable NonEmpty 
Instance details

Defined in Data.Key

Methods

adjust :: (a -> a) -> Key NonEmpty -> NonEmpty a -> NonEmpty a #

replace :: Key NonEmpty -> a -> NonEmpty a -> NonEmpty a #

FoldableWithKey NonEmpty 
Instance details

Defined in Data.Key

Methods

toKeyedList :: NonEmpty a -> [(Key NonEmpty, a)] #

foldMapWithKey :: Monoid m => (Key NonEmpty -> a -> m) -> NonEmpty a -> m #

foldrWithKey :: (Key NonEmpty -> a -> b -> b) -> b -> NonEmpty a -> b #

foldlWithKey :: (b -> Key NonEmpty -> a -> b) -> b -> NonEmpty a -> b #

FoldableWithKey1 NonEmpty 
Instance details

Defined in Data.Key

Methods

foldMapWithKey1 :: Semigroup m => (Key NonEmpty -> a -> m) -> NonEmpty a -> m #

Indexable NonEmpty 
Instance details

Defined in Data.Key

Methods

index :: NonEmpty a -> Key NonEmpty -> a #

Keyed NonEmpty 
Instance details

Defined in Data.Key

Methods

mapWithKey :: (Key NonEmpty -> a -> b) -> NonEmpty a -> NonEmpty b #

Lookup NonEmpty 
Instance details

Defined in Data.Key

Methods

lookup :: Key NonEmpty -> NonEmpty a -> Maybe a #

TraversableWithKey NonEmpty 
Instance details

Defined in Data.Key

Methods

traverseWithKey :: Applicative f => (Key NonEmpty -> a -> f b) -> NonEmpty a -> f (NonEmpty b) #

mapWithKeyM :: Monad m => (Key NonEmpty -> a -> m b) -> NonEmpty a -> m (NonEmpty b) #

TraversableWithKey1 NonEmpty 
Instance details

Defined in Data.Key

Methods

traverseWithKey1 :: Apply f => (Key NonEmpty -> a -> f b) -> NonEmpty a -> f (NonEmpty b) #

Zip NonEmpty 
Instance details

Defined in Data.Key

Methods

zipWith :: (a -> b -> c) -> NonEmpty a -> NonEmpty b -> NonEmpty c #

zip :: NonEmpty a -> NonEmpty b -> NonEmpty (a, b) #

zap :: NonEmpty (a -> b) -> NonEmpty a -> NonEmpty b #

ZipWithKey NonEmpty 
Instance details

Defined in Data.Key

Methods

zipWithKey :: (Key NonEmpty -> a -> b -> c) -> NonEmpty a -> NonEmpty b -> NonEmpty c #

zapWithKey :: NonEmpty (Key NonEmpty -> a -> b) -> NonEmpty a -> NonEmpty b #

Apply NonEmpty 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(<.>) :: NonEmpty (a -> b) -> NonEmpty a -> NonEmpty b #

(.>) :: NonEmpty a -> NonEmpty b -> NonEmpty b #

(<.) :: NonEmpty a -> NonEmpty b -> NonEmpty a #

liftF2 :: (a -> b -> c) -> NonEmpty a -> NonEmpty b -> NonEmpty c #

Bind NonEmpty 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(>>-) :: NonEmpty a -> (a -> NonEmpty b) -> NonEmpty b #

join :: NonEmpty (NonEmpty a) -> NonEmpty a #

Lift a => Lift (NonEmpty a :: Type)

Since: template-haskell-2.15.0.0

Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => NonEmpty a -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => NonEmpty a -> Code m (NonEmpty a) #

FromJSON a => FromJSON (NonEmpty a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON a => ToJSON (NonEmpty a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Semigroup (NonEmpty a)

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

(<>) :: NonEmpty a -> NonEmpty a -> NonEmpty a #

sconcat :: NonEmpty (NonEmpty a) -> NonEmpty a #

stimes :: Integral b => b -> NonEmpty a -> NonEmpty a #

IsList (NonEmpty a)

Since: base-4.9.0.0

Instance details

Defined in GHC.Exts

Associated Types

type Item (NonEmpty a) #

Methods

fromList :: [Item (NonEmpty a)] -> NonEmpty a #

fromListN :: Int -> [Item (NonEmpty a)] -> NonEmpty a #

toList :: NonEmpty a -> [Item (NonEmpty a)] #

Generic (NonEmpty a) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (NonEmpty a) :: Type -> Type #

Methods

from :: NonEmpty a -> Rep (NonEmpty a) x #

to :: Rep (NonEmpty a) x -> NonEmpty a #

Read a => Read (NonEmpty a)

Since: base-4.11.0.0

Instance details

Defined in GHC.Read

Show a => Show (NonEmpty a)

Since: base-4.11.0.0

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> NonEmpty a -> ShowS #

show :: NonEmpty a -> String #

showList :: [NonEmpty a] -> ShowS #

NFData a => NFData (NonEmpty a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: NonEmpty a -> () #

Eq a => Eq (NonEmpty a)

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

(==) :: NonEmpty a -> NonEmpty a -> Bool #

(/=) :: NonEmpty a -> NonEmpty a -> Bool #

Ord a => Ord (NonEmpty a)

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

compare :: NonEmpty a -> NonEmpty a -> Ordering #

(<) :: NonEmpty a -> NonEmpty a -> Bool #

(<=) :: NonEmpty a -> NonEmpty a -> Bool #

(>) :: NonEmpty a -> NonEmpty a -> Bool #

(>=) :: NonEmpty a -> NonEmpty a -> Bool #

max :: NonEmpty a -> NonEmpty a -> NonEmpty a #

min :: NonEmpty a -> NonEmpty a -> NonEmpty a #

Hashable a => Hashable (NonEmpty a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> NonEmpty a -> Int #

hash :: NonEmpty a -> Int #

Ixed (NonEmpty a) 
Instance details

Defined in Lens.Micro.Internal

Methods

ix :: Index (NonEmpty a) -> Traversal' (NonEmpty a) (IxValue (NonEmpty a)) #

GrowingAppend (NonEmpty a) 
Instance details

Defined in Data.MonoTraversable

MonoFoldable (NonEmpty a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (NonEmpty a) -> m) -> NonEmpty a -> m #

ofoldr :: (Element (NonEmpty a) -> b -> b) -> b -> NonEmpty a -> b #

ofoldl' :: (a0 -> Element (NonEmpty a) -> a0) -> a0 -> NonEmpty a -> a0 #

otoList :: NonEmpty a -> [Element (NonEmpty a)] #

oall :: (Element (NonEmpty a) -> Bool) -> NonEmpty a -> Bool #

oany :: (Element (NonEmpty a) -> Bool) -> NonEmpty a -> Bool #

onull :: NonEmpty a -> Bool #

olength :: NonEmpty a -> Int #

olength64 :: NonEmpty a -> Int64 #

ocompareLength :: Integral i => NonEmpty a -> i -> Ordering #

otraverse_ :: Applicative f => (Element (NonEmpty a) -> f b) -> NonEmpty a -> f () #

ofor_ :: Applicative f => NonEmpty a -> (Element (NonEmpty a) -> f b) -> f () #

omapM_ :: Applicative m => (Element (NonEmpty a) -> m ()) -> NonEmpty a -> m () #

oforM_ :: Applicative m => NonEmpty a -> (Element (NonEmpty a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (NonEmpty a) -> m a0) -> a0 -> NonEmpty a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (NonEmpty a) -> m) -> NonEmpty a -> m #

ofoldr1Ex :: (Element (NonEmpty a) -> Element (NonEmpty a) -> Element (NonEmpty a)) -> NonEmpty a -> Element (NonEmpty a) #

ofoldl1Ex' :: (Element (NonEmpty a) -> Element (NonEmpty a) -> Element (NonEmpty a)) -> NonEmpty a -> Element (NonEmpty a) #

headEx :: NonEmpty a -> Element (NonEmpty a) #

lastEx :: NonEmpty a -> Element (NonEmpty a) #

unsafeHead :: NonEmpty a -> Element (NonEmpty a) #

unsafeLast :: NonEmpty a -> Element (NonEmpty a) #

maximumByEx :: (Element (NonEmpty a) -> Element (NonEmpty a) -> Ordering) -> NonEmpty a -> Element (NonEmpty a) #

minimumByEx :: (Element (NonEmpty a) -> Element (NonEmpty a) -> Ordering) -> NonEmpty a -> Element (NonEmpty a) #

oelem :: Element (NonEmpty a) -> NonEmpty a -> Bool #

onotElem :: Element (NonEmpty a) -> NonEmpty a -> Bool #

MonoFunctor (NonEmpty a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (NonEmpty a) -> Element (NonEmpty a)) -> NonEmpty a -> NonEmpty a #

MonoPointed (NonEmpty a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (NonEmpty a) -> NonEmpty a #

MonoTraversable (NonEmpty a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (NonEmpty a) -> f (Element (NonEmpty a))) -> NonEmpty a -> f (NonEmpty a) #

omapM :: Applicative m => (Element (NonEmpty a) -> m (Element (NonEmpty a))) -> NonEmpty a -> m (NonEmpty a) #

SemiSequence (NonEmpty a) 
Instance details

Defined in Data.Sequences

Associated Types

type Index (NonEmpty a) #

Pretty a => Pretty (NonEmpty a) 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: NonEmpty a -> Doc ann #

prettyList :: [NonEmpty a] -> Doc ann #

Container (NonEmpty a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (NonEmpty a) #

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 #

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 #

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)) #

safeMaximum :: NonEmpty a -> Maybe (Element (NonEmpty a)) #

safeMinimum :: NonEmpty a -> Maybe (Element (NonEmpty a)) #

safeFoldr1 :: (Element (NonEmpty a) -> Element (NonEmpty a) -> Element (NonEmpty a)) -> NonEmpty a -> Maybe (Element (NonEmpty a)) #

safeFoldl1 :: (Element (NonEmpty a) -> Element (NonEmpty a) -> Element (NonEmpty a)) -> NonEmpty a -> Maybe (Element (NonEmpty a)) #

FromList (NonEmpty a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type ListElement (NonEmpty a) #

type FromListC (NonEmpty a) #

Methods

fromList :: [ListElement (NonEmpty a)] -> NonEmpty a #

One (NonEmpty a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (NonEmpty a) #

Methods

one :: OneItem (NonEmpty a) -> NonEmpty a #

ToPairs (NonEmpty (k, v)) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Key (NonEmpty (k, v)) #

type Val (NonEmpty (k, v)) #

Methods

toPairs :: NonEmpty (k, v) -> [(Key (NonEmpty (k, v)), Val (NonEmpty (k, v)))] #

keys :: NonEmpty (k, v) -> [Key (NonEmpty (k, v))] #

elems :: NonEmpty (k, v) -> [Val (NonEmpty (k, v))] #

Generic1 NonEmpty 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 NonEmpty :: k -> Type #

Methods

from1 :: forall (a :: k). NonEmpty a -> Rep1 NonEmpty a #

to1 :: forall (a :: k). Rep1 NonEmpty a -> NonEmpty a #

Each (NonEmpty a) (NonEmpty b) a b 
Instance details

Defined in Lens.Micro.Internal

Methods

each :: Traversal (NonEmpty a) (NonEmpty b) a b #

type Key NonEmpty 
Instance details

Defined in Data.Key

type Item (NonEmpty a) 
Instance details

Defined in GHC.Exts

type Item (NonEmpty a) = a
type Rep (NonEmpty a)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

type Index (NonEmpty a) 
Instance details

Defined in Lens.Micro.Internal

type Index (NonEmpty a) = Int
type IxValue (NonEmpty a) 
Instance details

Defined in Lens.Micro.Internal

type IxValue (NonEmpty a) = a
type Element (NonEmpty a) 
Instance details

Defined in Data.MonoTraversable

type Element (NonEmpty a) = a
type Index (NonEmpty a) 
Instance details

Defined in Data.Sequences

type Index (NonEmpty a) = Int
type Element (NonEmpty a) 
Instance details

Defined in Universum.Container.Class

type Element (NonEmpty a) = ElementDefault (NonEmpty a)
type FromListC (NonEmpty a) 
Instance details

Defined in Universum.Container.Class

type Key (NonEmpty (k, v)) 
Instance details

Defined in Universum.Container.Class

type Key (NonEmpty (k, v)) = k
type ListElement (NonEmpty a) 
Instance details

Defined in Universum.Container.Class

type OneItem (NonEmpty a) 
Instance details

Defined in Universum.Container.Class

type OneItem (NonEmpty a) = a
type Val (NonEmpty (k, v)) 
Instance details

Defined in Universum.Container.Class

type Val (NonEmpty (k, v)) = v
type Rep1 NonEmpty

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

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.

ord :: Char -> Int #

The fromEnum method restricted to the type Char.

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

liftA3 :: Applicative f => (a -> b -> c -> d) -> f a -> f b -> f c -> f d #

Lift a ternary function to actions.

flip :: (a -> b -> c) -> b -> a -> c #

flip f takes its (first) two arguments in the reverse order of f.

>>> flip (++) "hello" "world"
"worldhello"

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.

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

(=<<) :: Monad m => (a -> m b) -> m a -> m b infixr 1 #

Same as >>=, but with the arguments interchanged.

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

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

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 \(\mathcal{O}(1)\) rather than \(\mathcal{O}(\log n)\)

data SomeException #

The SomeException type is the root of the exception type hierarchy. When an exception of type e is thrown, behind the scenes it is encapsulated in a SomeException.

Constructors

Exception e => SomeException e 

Instances

Instances details
Out SomeException Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Exception SomeException

Since: base-3.0

Instance details

Defined in GHC.Exception.Type

Show SomeException

Since: base-3.0

Instance details

Defined in GHC.Exception.Type

(&&) :: Bool -> Bool -> Bool infixr 3 #

Boolean "and", lazy in the second argument

not :: Bool -> Bool #

Boolean "not"

(||) :: Bool -> Bool -> Bool infixr 2 #

Boolean "or", lazy in the second argument

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.

data Vector a #

Boxed vectors, supporting efficient slicing.

Instances

Instances details
FromJSON1 Vector 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (Vector a) #

liftParseJSONList :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [Vector a] #

ToJSON1 Vector 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Value) -> ([a] -> Value) -> Vector a -> Value #

liftToJSONList :: (a -> Value) -> ([a] -> Value) -> [Vector a] -> Value #

liftToEncoding :: (a -> Encoding) -> ([a] -> Encoding) -> Vector a -> Encoding #

liftToEncodingList :: (a -> Encoding) -> ([a] -> Encoding) -> [Vector a] -> Encoding #

MonadFail Vector

Since: vector-0.12.1.0

Instance details

Defined in Data.Vector

Methods

fail :: String -> Vector a #

MonadFix Vector

Instance has same semantics as one for lists

Since: vector-0.12.2.0

Instance details

Defined in Data.Vector

Methods

mfix :: (a -> Vector a) -> Vector a #

MonadZip Vector 
Instance details

Defined in Data.Vector

Methods

mzip :: Vector a -> Vector b -> Vector (a, b) #

mzipWith :: (a -> b -> c) -> Vector a -> Vector b -> Vector c #

munzip :: Vector (a, b) -> (Vector a, Vector b) #

Foldable Vector 
Instance details

Defined in Data.Vector

Methods

fold :: Monoid m => Vector m -> m #

foldMap :: Monoid m => (a -> m) -> Vector a -> m #

foldMap' :: Monoid m => (a -> m) -> Vector a -> m #

foldr :: (a -> b -> b) -> b -> Vector a -> b #

foldr' :: (a -> b -> b) -> b -> Vector a -> b #

foldl :: (b -> a -> b) -> b -> Vector a -> b #

foldl' :: (b -> a -> b) -> b -> Vector a -> b #

foldr1 :: (a -> a -> a) -> Vector a -> a #

foldl1 :: (a -> a -> a) -> Vector a -> a #

toList :: Vector a -> [a] #

null :: Vector a -> Bool #

length :: Vector a -> Int #

elem :: Eq a => a -> Vector a -> Bool #

maximum :: Ord a => Vector a -> a #

minimum :: Ord a => Vector a -> a #

sum :: Num a => Vector a -> a #

product :: Num a => Vector a -> a #

Eq1 Vector 
Instance details

Defined in Data.Vector

Methods

liftEq :: (a -> b -> Bool) -> Vector a -> Vector b -> Bool #

Ord1 Vector 
Instance details

Defined in Data.Vector

Methods

liftCompare :: (a -> b -> Ordering) -> Vector a -> Vector b -> Ordering #

Read1 Vector 
Instance details

Defined in Data.Vector

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (Vector a) #

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [Vector a] #

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (Vector a) #

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [Vector a] #

Show1 Vector 
Instance details

Defined in Data.Vector

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Vector a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Vector a] -> ShowS #

Traversable Vector 
Instance details

Defined in Data.Vector

Methods

traverse :: Applicative f => (a -> f b) -> Vector a -> f (Vector b) #

sequenceA :: Applicative f => Vector (f a) -> f (Vector a) #

mapM :: Monad m => (a -> m b) -> Vector a -> m (Vector b) #

sequence :: Monad m => Vector (m a) -> m (Vector a) #

Alternative Vector 
Instance details

Defined in Data.Vector

Methods

empty :: Vector a #

(<|>) :: Vector a -> Vector a -> Vector a #

some :: Vector a -> Vector [a] #

many :: Vector a -> Vector [a] #

Applicative Vector 
Instance details

Defined in Data.Vector

Methods

pure :: a -> Vector a #

(<*>) :: Vector (a -> b) -> Vector a -> Vector b #

liftA2 :: (a -> b -> c) -> Vector a -> Vector b -> Vector c #

(*>) :: Vector a -> Vector b -> Vector b #

(<*) :: Vector a -> Vector b -> Vector a #

Functor Vector 
Instance details

Defined in Data.Vector

Methods

fmap :: (a -> b) -> Vector a -> Vector b #

(<$) :: a -> Vector b -> Vector a #

Monad Vector 
Instance details

Defined in Data.Vector

Methods

(>>=) :: Vector a -> (a -> Vector b) -> Vector b #

(>>) :: Vector a -> Vector b -> Vector b #

return :: a -> Vector a #

MonadPlus Vector 
Instance details

Defined in Data.Vector

Methods

mzero :: Vector a #

mplus :: Vector a -> Vector a -> Vector a #

Zip Vector 
Instance details

Defined in Data.ChunkedZip

Methods

zipWith :: (a -> b -> c) -> Vector a -> Vector b -> Vector c #

zip :: Vector a -> Vector b -> Vector (a, b) #

zap :: Vector (a -> b) -> Vector a -> Vector b #

unzip :: Vector (a, b) -> (Vector a, Vector b) #

Zip3 Vector 
Instance details

Defined in Data.ChunkedZip

Methods

zipWith3 :: (a -> b -> c -> d) -> Vector a -> Vector b -> Vector c -> Vector d #

zip3 :: Vector a -> Vector b -> Vector c -> Vector (a, b, c) #

zap3 :: Vector (a -> b -> c) -> Vector a -> Vector b -> Vector c #

unzip3 :: Vector (a, b, c) -> (Vector a, Vector b, Vector c) #

Zip4 Vector 
Instance details

Defined in Data.ChunkedZip

Methods

zipWith4 :: (a -> b -> c -> d -> e) -> Vector a -> Vector b -> Vector c -> Vector d -> Vector e #

zip4 :: Vector a -> Vector b -> Vector c -> Vector d -> Vector (a, b, c, d) #

zap4 :: Vector (a -> b -> c -> d) -> Vector a -> Vector b -> Vector c -> Vector d #

unzip4 :: Vector (a, b, c, d) -> (Vector a, Vector b, Vector c, Vector d) #

Zip5 Vector 
Instance details

Defined in Data.ChunkedZip

Methods

zipWith5 :: (a -> b -> c -> d -> e -> g) -> Vector a -> Vector b -> Vector c -> Vector d -> Vector e -> Vector g #

zip5 :: Vector a -> Vector b -> Vector c -> Vector d -> Vector e -> Vector (a, b, c, d, e) #

zap5 :: Vector (a -> b -> c -> d -> e) -> Vector a -> Vector b -> Vector c -> Vector d -> Vector e #

unzip5 :: Vector (a, b, c, d, e) -> (Vector a, Vector b, Vector c, Vector d, Vector e) #

Zip6 Vector 
Instance details

Defined in Data.ChunkedZip

Methods

zipWith6 :: (a -> b -> c -> d -> e -> g -> h) -> Vector a -> Vector b -> Vector c -> Vector d -> Vector e -> Vector g -> Vector h #

zip6 :: Vector a -> Vector b -> Vector c -> Vector d -> Vector e -> Vector g -> Vector (a, b, c, d, e, g) #

zap6 :: Vector (a -> b -> c -> d -> e -> g) -> Vector a -> Vector b -> Vector c -> Vector d -> Vector e -> Vector g #

unzip6 :: Vector (a, b, c, d, e, g) -> (Vector a, Vector b, Vector c, Vector d, Vector e, Vector g) #

NFData1 Vector

Since: vector-0.12.1.0

Instance details

Defined in Data.Vector

Methods

liftRnf :: (a -> ()) -> Vector a -> () #

Vector Vector a 
Instance details

Defined in Data.Vector

Methods

basicUnsafeFreeze :: 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 InputFailure "vec'fieldLocation" (Vector FieldIndex) 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

fieldOf :: Functor f => Proxy# "vec'fieldLocation" -> (Vector FieldIndex -> f (Vector FieldIndex)) -> InputFailure -> f InputFailure

HasField Response'Failure "vec'generic" (Vector InputFailure) 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

HasField Response'Failure "vec'internal" (Vector InternalFailure) 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

HasField Response'Failure "vec'specific" (Vector Response'Failure'InputFailure) 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

HasField Response'Success "vec'lspLnNodes" (Vector LnPeer) 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Methods

fieldOf :: Functor f => Proxy# "vec'lspLnNodes" -> (Vector LnPeer -> f (Vector LnPeer)) -> Response'Success -> f Response'Success

HasField Response'Failure "vec'generic" (Vector InputFailure) 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

HasField Response'Failure "vec'internal" (Vector InternalFailure) 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

HasField Response'Failure "vec'specific" (Vector Response'Failure'InputFailure) 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

HasField Response'Failure "vec'generic" (Vector InputFailure) 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

HasField Response'Failure "vec'internal" (Vector InternalFailure) 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

HasField Response'Failure "vec'specific" (Vector Response'Failure'InputFailure) 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

HasField AddHoldInvoiceRequest "vec'routeHints" (Vector RouteHint) 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

fieldOf :: Functor f => Proxy# "vec'routeHints" -> (Vector RouteHint -> f (Vector RouteHint)) -> AddHoldInvoiceRequest -> f AddHoldInvoiceRequest

HasField BatchOpenChannelRequest "vec'channels" (Vector BatchOpenChannel) 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "vec'channels" -> (Vector BatchOpenChannel -> f (Vector BatchOpenChannel)) -> BatchOpenChannelRequest -> f BatchOpenChannelRequest

HasField BatchOpenChannelResponse "vec'pendingChannels" (Vector PendingUpdate) 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "vec'pendingChannels" -> (Vector PendingUpdate -> f (Vector PendingUpdate)) -> BatchOpenChannelResponse -> f BatchOpenChannelResponse

HasField ClosedChannelsResponse "vec'channels" (Vector ChannelCloseSummary) 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "vec'channels" -> (Vector ChannelCloseSummary -> f (Vector ChannelCloseSummary)) -> ClosedChannelsResponse -> f ClosedChannelsResponse

HasField GetInfoResponse "vec'chains" (Vector Chain) 
Instance details

Defined in Proto.Lightning

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.Lightning

Methods

fieldOf :: Functor f => Proxy# "vec'uris" -> (Vector Text -> f (Vector Text)) -> GetInfoResponse -> f GetInfoResponse

HasField ListChannelsResponse "vec'channels" (Vector Channel) 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "vec'channels" -> (Vector Channel -> f (Vector Channel)) -> ListChannelsResponse -> f ListChannelsResponse

HasField ListPeersResponse "vec'peers" (Vector Peer) 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "vec'peers" -> (Vector Peer -> f (Vector Peer)) -> ListPeersResponse -> f ListPeersResponse

HasField ListUnspentResponse "vec'utxos" (Vector Utxo) 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "vec'utxos" -> (Vector Utxo -> f (Vector Utxo)) -> ListUnspentResponse -> f ListUnspentResponse

HasField Peer "vec'errors" (Vector TimestampedError) 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "vec'errors" -> (Vector TimestampedError -> f (Vector TimestampedError)) -> Peer -> f Peer

HasField SendRequest "vec'destFeatures" (Vector FeatureBit) 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "vec'destFeatures" -> (Vector FeatureBit -> f (Vector FeatureBit)) -> SendRequest -> f SendRequest

HasField Transaction "vec'destAddresses" (Vector Text) 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "vec'destAddresses" -> (Vector Text -> f (Vector Text)) -> Transaction -> f Transaction

HasField TransactionDetails "vec'transactions" (Vector Transaction) 
Instance details

Defined in Proto.Lightning

Methods

fieldOf :: Functor f => Proxy# "vec'transactions" -> (Vector Transaction -> f (Vector Transaction)) -> TransactionDetails -> f TransactionDetails

HasField Channel "vec'pendingHtlcs" (Vector HTLC) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "vec'pendingHtlcs" -> (Vector HTLC -> f (Vector HTLC)) -> Channel -> f Channel

HasField ChannelCloseSummary "vec'resolutions" (Vector Resolution) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "vec'resolutions" -> (Vector Resolution -> f (Vector Resolution)) -> ChannelCloseSummary -> f ChannelCloseSummary

HasField ChannelGraph "vec'edges" (Vector ChannelEdge) 
Instance details

Defined in Proto.Lnrpc.Ln0

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.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "vec'nodes" -> (Vector LightningNode -> f (Vector LightningNode)) -> ChannelGraph -> f ChannelGraph

HasField GraphTopologyUpdate "vec'channelUpdates" (Vector ChannelEdgeUpdate) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "vec'channelUpdates" -> (Vector ChannelEdgeUpdate -> f (Vector ChannelEdgeUpdate)) -> GraphTopologyUpdate -> f GraphTopologyUpdate

HasField GraphTopologyUpdate "vec'closedChans" (Vector ClosedChannelUpdate) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "vec'closedChans" -> (Vector ClosedChannelUpdate -> f (Vector ClosedChannelUpdate)) -> GraphTopologyUpdate -> f GraphTopologyUpdate

HasField GraphTopologyUpdate "vec'nodeUpdates" (Vector NodeUpdate) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "vec'nodeUpdates" -> (Vector NodeUpdate -> f (Vector NodeUpdate)) -> GraphTopologyUpdate -> f GraphTopologyUpdate

HasField LightningNode "vec'addresses" (Vector NodeAddress) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "vec'addresses" -> (Vector NodeAddress -> f (Vector NodeAddress)) -> LightningNode -> f LightningNode

HasField NodeInfo "vec'channels" (Vector ChannelEdge) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "vec'channels" -> (Vector ChannelEdge -> f (Vector ChannelEdge)) -> NodeInfo -> f NodeInfo

HasField NodeMetricsRequest "vec'types" (Vector NodeMetricType) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "vec'types" -> (Vector NodeMetricType -> f (Vector NodeMetricType)) -> NodeMetricsRequest -> f NodeMetricsRequest

HasField NodeUpdate "vec'addresses" (Vector Text) 
Instance details

Defined in Proto.Lnrpc.Ln0

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.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "vec'nodeAddresses" -> (Vector NodeAddress -> f (Vector NodeAddress)) -> NodeUpdate -> f NodeUpdate

HasField PendingChannelsResponse "vec'pendingClosingChannels" (Vector PendingChannelsResponse'ClosedChannel) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "vec'pendingClosingChannels" -> (Vector PendingChannelsResponse'ClosedChannel -> f (Vector PendingChannelsResponse'ClosedChannel)) -> PendingChannelsResponse -> f PendingChannelsResponse

HasField PendingChannelsResponse "vec'pendingForceClosingChannels" (Vector PendingChannelsResponse'ForceClosedChannel) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "vec'pendingForceClosingChannels" -> (Vector PendingChannelsResponse'ForceClosedChannel -> f (Vector PendingChannelsResponse'ForceClosedChannel)) -> PendingChannelsResponse -> f PendingChannelsResponse

HasField PendingChannelsResponse "vec'pendingOpenChannels" (Vector PendingChannelsResponse'PendingOpenChannel) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "vec'pendingOpenChannels" -> (Vector PendingChannelsResponse'PendingOpenChannel -> f (Vector PendingChannelsResponse'PendingOpenChannel)) -> PendingChannelsResponse -> f PendingChannelsResponse

HasField PendingChannelsResponse "vec'waitingCloseChannels" (Vector PendingChannelsResponse'WaitingCloseChannel) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "vec'waitingCloseChannels" -> (Vector PendingChannelsResponse'WaitingCloseChannel -> f (Vector PendingChannelsResponse'WaitingCloseChannel)) -> PendingChannelsResponse -> f PendingChannelsResponse

HasField PendingChannelsResponse'ForceClosedChannel "vec'pendingHtlcs" (Vector PendingHTLC) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "vec'pendingHtlcs" -> (Vector PendingHTLC -> f (Vector PendingHTLC)) -> PendingChannelsResponse'ForceClosedChannel -> f PendingChannelsResponse'ForceClosedChannel

HasField QueryRoutesRequest "vec'destFeatures" (Vector FeatureBit) 
Instance details

Defined in Proto.Lnrpc.Ln0

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.Lnrpc.Ln0

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.Lnrpc.Ln0

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.Lnrpc.Ln0

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.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "vec'routeHints" -> (Vector RouteHint -> f (Vector RouteHint)) -> QueryRoutesRequest -> f QueryRoutesRequest

HasField QueryRoutesResponse "vec'routes" (Vector Route) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "vec'routes" -> (Vector Route -> f (Vector Route)) -> QueryRoutesResponse -> f QueryRoutesResponse

HasField Route "vec'hops" (Vector Hop) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "vec'hops" -> (Vector Hop -> f (Vector Hop)) -> Route -> f Route

HasField RouteHint "vec'hopHints" (Vector HopHint) 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

fieldOf :: Functor f => Proxy# "vec'hopHints" -> (Vector HopHint -> f (Vector HopHint)) -> RouteHint -> f RouteHint

HasField BakeMacaroonRequest "vec'permissions" (Vector MacaroonPermission) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "vec'permissions" -> (Vector MacaroonPermission -> f (Vector MacaroonPermission)) -> BakeMacaroonRequest -> f BakeMacaroonRequest

HasField ChannelBackups "vec'chanBackups" (Vector ChannelBackup) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "vec'chanBackups" -> (Vector ChannelBackup -> f (Vector ChannelBackup)) -> ChannelBackups -> f ChannelBackups

HasField CheckMacPermRequest "vec'permissions" (Vector MacaroonPermission) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "vec'permissions" -> (Vector MacaroonPermission -> f (Vector MacaroonPermission)) -> CheckMacPermRequest -> f CheckMacPermRequest

HasField FeeReportResponse "vec'channelFees" (Vector ChannelFeeReport) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "vec'channelFees" -> (Vector ChannelFeeReport -> f (Vector ChannelFeeReport)) -> FeeReportResponse -> f FeeReportResponse

HasField ForwardingHistoryResponse "vec'forwardingEvents" (Vector ForwardingEvent) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "vec'forwardingEvents" -> (Vector ForwardingEvent -> f (Vector ForwardingEvent)) -> ForwardingHistoryResponse -> f ForwardingHistoryResponse

HasField Invoice "vec'htlcs" (Vector InvoiceHTLC) 
Instance details

Defined in Proto.Lnrpc.Ln1

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.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "vec'routeHints" -> (Vector RouteHint -> f (Vector RouteHint)) -> Invoice -> f Invoice

HasField ListInvoiceResponse "vec'invoices" (Vector Invoice) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "vec'invoices" -> (Vector Invoice -> f (Vector Invoice)) -> ListInvoiceResponse -> f ListInvoiceResponse

HasField ListPaymentsResponse "vec'payments" (Vector Payment) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "vec'payments" -> (Vector Payment -> f (Vector Payment)) -> ListPaymentsResponse -> f ListPaymentsResponse

HasField MacaroonId "vec'ops" (Vector Op) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "vec'ops" -> (Vector Op -> f (Vector Op)) -> MacaroonId -> f MacaroonId

HasField MacaroonPermissionList "vec'permissions" (Vector MacaroonPermission) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "vec'permissions" -> (Vector MacaroonPermission -> f (Vector MacaroonPermission)) -> MacaroonPermissionList -> f MacaroonPermissionList

HasField MultiChanBackup "vec'chanPoints" (Vector ChannelPoint) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "vec'chanPoints" -> (Vector ChannelPoint -> f (Vector ChannelPoint)) -> MultiChanBackup -> f MultiChanBackup

HasField Op "vec'actions" (Vector Text) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "vec'actions" -> (Vector Text -> f (Vector Text)) -> Op -> f Op

HasField PayReq "vec'routeHints" (Vector RouteHint) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "vec'routeHints" -> (Vector RouteHint -> f (Vector RouteHint)) -> PayReq -> f PayReq

HasField Payment "vec'htlcs" (Vector HTLCAttempt) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "vec'htlcs" -> (Vector HTLCAttempt -> f (Vector HTLCAttempt)) -> Payment -> f Payment

HasField PolicyUpdateResponse "vec'failedUpdates" (Vector FailedUpdate) 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

fieldOf :: Functor f => Proxy# "vec'failedUpdates" -> (Vector FailedUpdate -> f (Vector FailedUpdate)) -> PolicyUpdateResponse -> f PolicyUpdateResponse

HasField BuildRouteRequest "vec'hopPubkeys" (Vector ByteString) 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "vec'hopPubkeys" -> (Vector ByteString -> f (Vector ByteString)) -> BuildRouteRequest -> f BuildRouteRequest

HasField PaymentStatus "vec'htlcs" (Vector HTLCAttempt) 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "vec'htlcs" -> (Vector HTLCAttempt -> f (Vector HTLCAttempt)) -> PaymentStatus -> f PaymentStatus

HasField QueryMissionControlResponse "vec'pairs" (Vector PairHistory) 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "vec'pairs" -> (Vector PairHistory -> f (Vector PairHistory)) -> QueryMissionControlResponse -> f QueryMissionControlResponse

HasField SendPaymentRequest "vec'destFeatures" (Vector FeatureBit) 
Instance details

Defined in Proto.Routerrpc.Router

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.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "vec'routeHints" -> (Vector RouteHint -> f (Vector RouteHint)) -> SendPaymentRequest -> f SendPaymentRequest

HasField XImportMissionControlRequest "vec'pairs" (Vector PairHistory) 
Instance details

Defined in Proto.Routerrpc.Router

Methods

fieldOf :: Functor f => Proxy# "vec'pairs" -> (Vector PairHistory -> f (Vector PairHistory)) -> XImportMissionControlRequest -> f XImportMissionControlRequest

HasField InputScript "vec'witness" (Vector ByteString) 
Instance details

Defined in Proto.Signrpc.Signer

Methods

fieldOf :: Functor f => Proxy# "vec'witness" -> (Vector ByteString -> f (Vector ByteString)) -> InputScript -> f InputScript

HasField InputScriptResp "vec'inputScripts" (Vector InputScript) 
Instance details

Defined in Proto.Signrpc.Signer

Methods

fieldOf :: Functor f => Proxy# "vec'inputScripts" -> (Vector InputScript -> f (Vector InputScript)) -> InputScriptResp -> f InputScriptResp

HasField SignReq "vec'signDescs" (Vector SignDescriptor) 
Instance details

Defined in Proto.Signrpc.Signer

Methods

fieldOf :: Functor f => Proxy# "vec'signDescs" -> (Vector SignDescriptor -> f (Vector SignDescriptor)) -> SignReq -> f SignReq

HasField SignResp "vec'rawSigs" (Vector ByteString) 
Instance details

Defined in Proto.Signrpc.Signer

Methods

fieldOf :: Functor f => Proxy# "vec'rawSigs" -> (Vector ByteString -> f (Vector ByteString)) -> SignResp -> f SignResp

HasField FundPsbtResponse "vec'lockedUtxos" (Vector UtxoLease) 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "vec'lockedUtxos" -> (Vector UtxoLease -> f (Vector UtxoLease)) -> FundPsbtResponse -> f FundPsbtResponse

HasField ImportAccountResponse "vec'dryRunExternalAddrs" (Vector Text) 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "vec'dryRunExternalAddrs" -> (Vector Text -> f (Vector Text)) -> ImportAccountResponse -> f ImportAccountResponse

HasField ImportAccountResponse "vec'dryRunInternalAddrs" (Vector Text) 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "vec'dryRunInternalAddrs" -> (Vector Text -> f (Vector Text)) -> ImportAccountResponse -> f ImportAccountResponse

HasField ListAccountsResponse "vec'accounts" (Vector Account) 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "vec'accounts" -> (Vector Account -> f (Vector Account)) -> ListAccountsResponse -> f ListAccountsResponse

HasField ListLeasesResponse "vec'lockedUtxos" (Vector UtxoLease) 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "vec'lockedUtxos" -> (Vector UtxoLease -> f (Vector UtxoLease)) -> ListLeasesResponse -> f ListLeasesResponse

HasField ListSweepsResponse'TransactionIDs "vec'transactionIds" (Vector Text) 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "vec'transactionIds" -> (Vector Text -> f (Vector Text)) -> ListSweepsResponse'TransactionIDs -> f ListSweepsResponse'TransactionIDs

HasField ListUnspentResponse "vec'utxos" (Vector Utxo) 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "vec'utxos" -> (Vector Utxo -> f (Vector Utxo)) -> ListUnspentResponse -> f ListUnspentResponse

HasField PendingSweepsResponse "vec'pendingSweeps" (Vector PendingSweep) 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "vec'pendingSweeps" -> (Vector PendingSweep -> f (Vector PendingSweep)) -> PendingSweepsResponse -> f PendingSweepsResponse

HasField SendOutputsRequest "vec'outputs" (Vector TxOut) 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "vec'outputs" -> (Vector TxOut -> f (Vector TxOut)) -> SendOutputsRequest -> f SendOutputsRequest

HasField TxTemplate "vec'inputs" (Vector OutPoint) 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

fieldOf :: Functor f => Proxy# "vec'inputs" -> (Vector OutPoint -> f (Vector OutPoint)) -> TxTemplate -> f TxTemplate

HasField GenSeedResponse "vec'cipherSeedMnemonic" (Vector Text) 
Instance details

Defined in Proto.Walletunlocker

Methods

fieldOf :: Functor f => Proxy# "vec'cipherSeedMnemonic" -> (Vector Text -> f (Vector Text)) -> GenSeedResponse -> f GenSeedResponse

HasField InitWalletRequest "vec'cipherSeedMnemonic" (Vector Text) 
Instance details

Defined in Proto.Walletunlocker

Methods

fieldOf :: Functor f => Proxy# "vec'cipherSeedMnemonic" -> (Vector Text -> f (Vector Text)) -> InitWalletRequest -> f InitWalletRequest

HasField WatchOnly "vec'accounts" (Vector WatchOnlyAccount) 
Instance details

Defined in Proto.Walletunlocker

Methods

fieldOf :: Functor f => Proxy# "vec'accounts" -> (Vector WatchOnlyAccount -> f (Vector WatchOnlyAccount)) -> WatchOnly -> f WatchOnly

FromJSON a => FromJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON a => ToJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Data a => Data (Vector a) 
Instance details

Defined in Data.Vector

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Vector a -> c (Vector a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Vector a) #

toConstr :: Vector a -> Constr #

dataTypeOf :: Vector a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Vector a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Vector a)) #

gmapT :: (forall b. Data b => b -> b) -> Vector a -> Vector a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Vector a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Vector a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Vector a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Vector a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Vector a -> m (Vector a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Vector a -> m (Vector a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Vector a -> m (Vector a) #

Monoid (Vector a) 
Instance details

Defined in Data.Vector

Methods

mempty :: Vector a #

mappend :: Vector a -> Vector a -> Vector a #

mconcat :: [Vector a] -> Vector a #

Semigroup (Vector a) 
Instance details

Defined in Data.Vector

Methods

(<>) :: Vector a -> Vector a -> Vector a #

sconcat :: NonEmpty (Vector a) -> Vector a #

stimes :: Integral b => b -> Vector a -> Vector a #

IsList (Vector a) 
Instance details

Defined in Data.Vector

Associated Types

type Item (Vector a) #

Methods

fromList :: [Item (Vector a)] -> Vector a #

fromListN :: Int -> [Item (Vector a)] -> Vector a #

toList :: Vector a -> [Item (Vector a)] #

Read a => Read (Vector a) 
Instance details

Defined in Data.Vector

Show a => Show (Vector a) 
Instance details

Defined in Data.Vector

Methods

showsPrec :: Int -> Vector a -> ShowS #

show :: Vector a -> String #

showList :: [Vector a] -> ShowS #

NFData a => NFData (Vector a) 
Instance details

Defined in Data.Vector

Methods

rnf :: Vector a -> () #

Eq a => Eq (Vector a) 
Instance details

Defined in Data.Vector

Methods

(==) :: Vector a -> Vector a -> Bool #

(/=) :: Vector a -> Vector a -> Bool #

Ord a => Ord (Vector a) 
Instance details

Defined in Data.Vector

Methods

compare :: Vector a -> Vector a -> Ordering #

(<) :: Vector a -> Vector a -> Bool #

(<=) :: Vector a -> Vector a -> Bool #

(>) :: Vector a -> Vector a -> Bool #

(>=) :: Vector a -> Vector a -> Bool #

max :: Vector a -> Vector a -> Vector a #

min :: Vector a -> Vector a -> Vector a #

GrowingAppend (Vector a) 
Instance details

Defined in Data.MonoTraversable

MonoFoldable (Vector a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (Vector a) -> m) -> Vector a -> m #

ofoldr :: (Element (Vector a) -> b -> b) -> b -> Vector a -> b #

ofoldl' :: (a0 -> Element (Vector a) -> a0) -> a0 -> Vector a -> a0 #

otoList :: Vector a -> [Element (Vector a)] #

oall :: (Element (Vector a) -> Bool) -> Vector a -> Bool #

oany :: (Element (Vector a) -> Bool) -> Vector a -> Bool #

onull :: Vector a -> Bool #

olength :: Vector a -> Int #

olength64 :: Vector a -> Int64 #

ocompareLength :: Integral i => Vector a -> i -> Ordering #

otraverse_ :: Applicative f => (Element (Vector a) -> f b) -> Vector a -> f () #

ofor_ :: Applicative f => Vector a -> (Element (Vector a) -> f b) -> f () #

omapM_ :: Applicative m => (Element (Vector a) -> m ()) -> Vector a -> m () #

oforM_ :: Applicative m => Vector a -> (Element (Vector a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (Vector a) -> m a0) -> a0 -> Vector a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (Vector a) -> m) -> Vector a -> m #

ofoldr1Ex :: (Element (Vector a) -> Element (Vector a) -> Element (Vector a)) -> Vector a -> Element (Vector a) #

ofoldl1Ex' :: (Element (Vector a) -> Element (Vector a) -> Element (Vector a)) -> Vector a -> Element (Vector a) #

headEx :: Vector a -> Element (Vector a) #

lastEx :: Vector a -> Element (Vector a) #

unsafeHead :: Vector a -> Element (Vector a) #

unsafeLast :: Vector a -> Element (Vector a) #

maximumByEx :: (Element (Vector a) -> Element (Vector a) -> Ordering) -> Vector a -> Element (Vector a) #

minimumByEx :: (Element (Vector a) -> Element (Vector a) -> Ordering) -> Vector a -> Element (Vector a) #

oelem :: Element (Vector a) -> Vector a -> Bool #

onotElem :: Element (Vector a) -> Vector a -> Bool #

MonoFunctor (Vector a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Vector a) -> Element (Vector a)) -> Vector a -> Vector a #

MonoPointed (Vector a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Vector a) -> Vector a #

MonoTraversable (Vector a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (Vector a) -> f (Element (Vector a))) -> Vector a -> f (Vector a) #

omapM :: Applicative m => (Element (Vector a) -> m (Element (Vector a))) -> Vector a -> m (Vector a) #

IsSequence (Vector a) 
Instance details

Defined in Data.Sequences

Methods

fromList :: [Element (Vector a)] -> Vector a #

lengthIndex :: Vector a -> Index (Vector a) #

break :: (Element (Vector a) -> Bool) -> Vector a -> (Vector a, Vector a) #

span :: (Element (Vector a) -> Bool) -> Vector a -> (Vector a, Vector a) #

dropWhile :: (Element (Vector a) -> Bool) -> Vector a -> Vector a #

takeWhile :: (Element (Vector a) -> Bool) -> Vector a -> Vector a #

splitAt :: Index (Vector a) -> Vector a -> (Vector a, Vector a) #

unsafeSplitAt :: Index (Vector a) -> Vector a -> (Vector a, Vector a) #

take :: Index (Vector a) -> Vector a -> Vector a #

unsafeTake :: Index (Vector a) -> Vector a -> Vector a #

drop :: Index (Vector a) -> Vector a -> Vector a #

unsafeDrop :: Index (Vector a) -> Vector a -> Vector a #

dropEnd :: Index (Vector a) -> Vector a -> Vector a #

partition :: (Element (Vector a) -> Bool) -> Vector a -> (Vector a, Vector a) #

uncons :: Vector a -> Maybe (Element (Vector a), Vector a) #

unsnoc :: Vector a -> Maybe (Vector a, Element (Vector a)) #

filter :: (Element (Vector a) -> Bool) -> Vector a -> Vector a #

filterM :: Monad m => (Element (Vector a) -> m Bool) -> Vector a -> m (Vector a) #

replicate :: Index (Vector a) -> Element (Vector a) -> Vector a #

replicateM :: Monad m => Index (Vector a) -> m (Element (Vector a)) -> m (Vector a) #

groupBy :: (Element (Vector a) -> Element (Vector a) -> Bool) -> Vector a -> [Vector a] #

groupAllOn :: Eq b => (Element (Vector a) -> b) -> Vector a -> [Vector a] #

subsequences :: Vector a -> [Vector a] #

permutations :: Vector a -> [Vector a] #

tailEx :: Vector a -> Vector a #

tailMay :: Vector a -> Maybe (Vector a) #

initEx :: Vector a -> Vector a #

initMay :: Vector a -> Maybe (Vector a) #

unsafeTail :: Vector a -> Vector a #

unsafeInit :: Vector a -> Vector a #

index :: Vector a -> Index (Vector a) -> Maybe (Element (Vector a)) #

indexEx :: Vector a -> Index (Vector a) -> Element (Vector a) #

unsafeIndex :: Vector a -> Index (Vector a) -> Element (Vector a) #

splitWhen :: (Element (Vector a) -> Bool) -> Vector a -> [Vector a] #

SemiSequence (Vector a) 
Instance details

Defined in Data.Sequences

Associated Types

type Index (Vector a) #

Methods

intersperse :: Element (Vector a) -> Vector a -> Vector a #

reverse :: Vector a -> Vector a #

find :: (Element (Vector a) -> Bool) -> Vector a -> Maybe (Element (Vector a)) #

sortBy :: (Element (Vector a) -> Element (Vector a) -> Ordering) -> Vector a -> Vector a #

cons :: Element (Vector a) -> Vector a -> Vector a #

snoc :: Vector a -> Element (Vector a) -> Vector a #

PersistField a => PersistField (Vector a) 
Instance details

Defined in Database.Persist.Class.PersistField

PersistFieldSql a => PersistFieldSql (Vector a) 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy (Vector a) -> SqlType #

ToBinary (Vector Word8) 
Instance details

Defined in Codec.QRCode.Data.ToInput

Methods

toBinary :: Vector Word8 -> [Word8] #

Container (Vector a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Vector a) #

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 #

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 #

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)) #

safeMaximum :: Vector a -> Maybe (Element (Vector a)) #

safeMinimum :: Vector a -> Maybe (Element (Vector a)) #

safeFoldr1 :: (Element (Vector a) -> Element (Vector a) -> Element (Vector a)) -> Vector a -> Maybe (Element (Vector a)) #

safeFoldl1 :: (Element (Vector a) -> Element (Vector a) -> Element (Vector a)) -> Vector a -> Maybe (Element (Vector a)) #

FromList (Vector a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type ListElement (Vector a) #

type FromListC (Vector a) #

Methods

fromList :: [ListElement (Vector a)] -> Vector a #

One (Vector a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (Vector a) #

Methods

one :: OneItem (Vector a) -> Vector a #

type Key Vector 
Instance details

Defined in Data.Vector.Instances

type Key Vector = Int
type Mutable Vector 
Instance details

Defined in Data.Vector

type Item (Vector a) 
Instance details

Defined in Data.Vector

type Item (Vector a) = a
type Element (Vector a) 
Instance details

Defined in Data.MonoTraversable

type Element (Vector a) = a
type Index (Vector a) 
Instance details

Defined in Data.Sequences

type Index (Vector a) = Int
type Element (Vector a) 
Instance details

Defined in Universum.Container.Class

type Element (Vector a) = ElementDefault (Vector a)
type FromListC (Vector a) 
Instance details

Defined in Universum.Container.Class

type FromListC (Vector a) = ()
type ListElement (Vector a) 
Instance details

Defined in Universum.Container.Class

type ListElement (Vector a) = Item (Vector a)
type OneItem (Vector a) 
Instance details

Defined in Universum.Container.Class

type OneItem (Vector a) = a

data HashSet a #

A set of values. A set cannot contain duplicate values.

Instances

Instances details
ToJSON1 HashSet 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Value) -> ([a] -> Value) -> HashSet a -> Value #

liftToJSONList :: (a -> Value) -> ([a] -> Value) -> [HashSet a] -> Value #

liftToEncoding :: (a -> Encoding) -> ([a] -> Encoding) -> HashSet a -> Encoding #

liftToEncodingList :: (a -> Encoding) -> ([a] -> Encoding) -> [HashSet a] -> Encoding #

Foldable HashSet 
Instance details

Defined in Data.HashSet.Internal

Methods

fold :: Monoid m => HashSet m -> m #

foldMap :: Monoid m => (a -> m) -> HashSet a -> m #

foldMap' :: Monoid m => (a -> m) -> HashSet a -> m #

foldr :: (a -> b -> b) -> b -> HashSet a -> b #

foldr' :: (a -> b -> b) -> b -> HashSet a -> b #

foldl :: (b -> a -> b) -> b -> HashSet a -> b #

foldl' :: (b -> a -> b) -> b -> HashSet a -> b #

foldr1 :: (a -> a -> a) -> HashSet a -> a #

foldl1 :: (a -> a -> a) -> HashSet a -> a #

toList :: HashSet a -> [a] #

null :: HashSet a -> Bool #

length :: HashSet a -> Int #

elem :: Eq a => a -> HashSet a -> Bool #

maximum :: Ord a => HashSet a -> a #

minimum :: Ord a => HashSet a -> a #

sum :: Num a => HashSet a -> a #

product :: Num a => HashSet a -> a #

Eq1 HashSet 
Instance details

Defined in Data.HashSet.Internal

Methods

liftEq :: (a -> b -> Bool) -> HashSet a -> HashSet b -> Bool #

Ord1 HashSet 
Instance details

Defined in Data.HashSet.Internal

Methods

liftCompare :: (a -> b -> Ordering) -> HashSet a -> HashSet b -> Ordering #

Show1 HashSet 
Instance details

Defined in Data.HashSet.Internal

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> HashSet a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [HashSet a] -> ShowS #

NFData1 HashSet

Since: unordered-containers-0.2.14.0

Instance details

Defined in Data.HashSet.Internal

Methods

liftRnf :: (a -> ()) -> HashSet a -> () #

Hashable1 HashSet 
Instance details

Defined in Data.HashSet.Internal

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> HashSet a -> Int #

Lift a => Lift (HashSet a :: Type)

Since: unordered-containers-0.2.17.0

Instance details

Defined in Data.HashSet.Internal

Methods

lift :: Quote m => HashSet a -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => HashSet a -> Code m (HashSet a) #

(Eq a, Hashable a, FromJSON a) => FromJSON (HashSet a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON a => ToJSON (HashSet a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

(Data a, Eq a, Hashable a) => Data (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> HashSet a -> c (HashSet a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (HashSet a) #

toConstr :: HashSet a -> Constr #

dataTypeOf :: HashSet a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (HashSet a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (HashSet a)) #

gmapT :: (forall b. Data b => b -> b) -> HashSet a -> HashSet a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HashSet a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HashSet a -> r #

gmapQ :: (forall d. Data d => d -> u) -> HashSet a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> HashSet a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> HashSet a -> m (HashSet a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HashSet a -> m (HashSet a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HashSet a -> m (HashSet a) #

(Hashable a, Eq a) => Monoid (HashSet a)

mempty = empty

mappend = union

O(n+m)

To obtain good performance, the smaller set must be presented as the first argument.

Examples

Expand
>>> mappend (fromList [1,2]) (fromList [2,3])
fromList [1,2,3]
Instance details

Defined in Data.HashSet.Internal

Methods

mempty :: HashSet a #

mappend :: HashSet a -> HashSet a -> HashSet a #

mconcat :: [HashSet a] -> HashSet a #

(Hashable a, Eq a) => Semigroup (HashSet a)

<> = union

O(n+m)

To obtain good performance, the smaller set must be presented as the first argument.

Examples

Expand
>>> fromList [1,2] <> fromList [2,3]
fromList [1,2,3]
Instance details

Defined in Data.HashSet.Internal

Methods

(<>) :: HashSet a -> HashSet a -> HashSet a #

sconcat :: NonEmpty (HashSet a) -> HashSet a #

stimes :: Integral b => b -> HashSet a -> HashSet a #

(Eq a, Hashable a) => IsList (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Associated Types

type Item (HashSet a) #

Methods

fromList :: [Item (HashSet a)] -> HashSet a #

fromListN :: Int -> [Item (HashSet a)] -> HashSet a #

toList :: HashSet a -> [Item (HashSet a)] #

(Eq a, Hashable a, Read a) => Read (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Show a => Show (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Methods

showsPrec :: Int -> HashSet a -> ShowS #

show :: HashSet a -> String #

showList :: [HashSet a] -> ShowS #

NFData a => NFData (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Methods

rnf :: HashSet a -> () #

Eq a => Eq (HashSet a)

Note that, in the presence of hash collisions, equal HashSets may behave differently, i.e. substitutivity may be violated:

>>> data D = A | B deriving (Eq, Show)
>>> instance Hashable D where hashWithSalt salt _d = salt
>>> x = fromList [A, B]
>>> y = fromList [B, A]
>>> x == y
True
>>> toList x
[A,B]
>>> toList y
[B,A]

In general, the lack of substitutivity can be observed with any function that depends on the key ordering, such as folds and traversals.

Instance details

Defined in Data.HashSet.Internal

Methods

(==) :: HashSet a -> HashSet a -> Bool #

(/=) :: HashSet a -> HashSet a -> Bool #

Ord a => Ord (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Methods

compare :: HashSet a -> HashSet a -> Ordering #

(<) :: HashSet a -> HashSet a -> Bool #

(<=) :: HashSet a -> HashSet a -> Bool #

(>) :: HashSet a -> HashSet a -> Bool #

(>=) :: HashSet a -> HashSet a -> Bool #

max :: HashSet a -> HashSet a -> HashSet a #

min :: HashSet a -> HashSet a -> HashSet a #

Hashable a => Hashable (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Methods

hashWithSalt :: Int -> HashSet a -> Int #

hash :: HashSet a -> Int #

(Eq element, Hashable element) => IsSet (HashSet element) 
Instance details

Defined in Data.Containers

Methods

insertSet :: Element (HashSet element) -> HashSet element -> HashSet element #

deleteSet :: Element (HashSet element) -> HashSet element -> HashSet element #

singletonSet :: Element (HashSet element) -> HashSet element #

setFromList :: [Element (HashSet element)] -> HashSet element #

setToList :: HashSet element -> [Element (HashSet element)] #

filterSet :: (Element (HashSet element) -> Bool) -> HashSet element -> HashSet element #

(Eq element, Hashable element) => SetContainer (HashSet element) 
Instance details

Defined in Data.Containers

Associated Types

type ContainerKey (HashSet element) #

Methods

member :: ContainerKey (HashSet element) -> HashSet element -> Bool #

notMember :: ContainerKey (HashSet element) -> HashSet element -> Bool #

union :: HashSet element -> HashSet element -> HashSet element #

unions :: (MonoFoldable mono, Element mono ~ HashSet element) => mono -> HashSet element #

difference :: HashSet element -> HashSet element -> HashSet element #

intersection :: HashSet element -> HashSet element -> HashSet element #

keys :: HashSet element -> [ContainerKey (HashSet element)] #

(Eq v, Hashable v) => GrowingAppend (HashSet v) 
Instance details

Defined in Data.MonoTraversable

MonoFoldable (HashSet e) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (HashSet e) -> m) -> HashSet e -> m #

ofoldr :: (Element (HashSet e) -> b -> b) -> b -> HashSet e -> b #

ofoldl' :: (a -> Element (HashSet e) -> a) -> a -> HashSet e -> a #

otoList :: HashSet e -> [Element (HashSet e)] #

oall :: (Element (HashSet e) -> Bool) -> HashSet e -> Bool #

oany :: (Element (HashSet e) -> Bool) -> HashSet e -> Bool #

onull :: HashSet e -> Bool #

olength :: HashSet e -> Int #

olength64 :: HashSet e -> Int64 #

ocompareLength :: Integral i => HashSet e -> i -> Ordering #

otraverse_ :: Applicative f => (Element (HashSet e) -> f b) -> HashSet e -> f () #

ofor_ :: Applicative f => HashSet e -> (Element (HashSet e) -> f b) -> f () #

omapM_ :: Applicative m => (Element (HashSet e) -> m ()) -> HashSet e -> m () #

oforM_ :: Applicative m => HashSet e -> (Element (HashSet e) -> m ()) -> m () #

ofoldlM :: Monad m => (a -> Element (HashSet e) -> m a) -> a -> HashSet e -> m a #

ofoldMap1Ex :: Semigroup m => (Element (HashSet e) -> m) -> HashSet e -> m #

ofoldr1Ex :: (Element (HashSet e) -> Element (HashSet e) -> Element (HashSet e)) -> HashSet e -> Element (HashSet e) #

ofoldl1Ex' :: (Element (HashSet e) -> Element (HashSet e) -> Element (HashSet e)) -> HashSet e -> Element (HashSet e) #

headEx :: HashSet e -> Element (HashSet e) #

lastEx :: HashSet e -> Element (HashSet e) #

unsafeHead :: HashSet e -> Element (HashSet e) #

unsafeLast :: HashSet e -> Element (HashSet e) #

maximumByEx :: (Element (HashSet e) -> Element (HashSet e) -> Ordering) -> HashSet e -> Element (HashSet e) #

minimumByEx :: (Element (HashSet e) -> Element (HashSet e) -> Ordering) -> HashSet e -> Element (HashSet e) #

oelem :: Element (HashSet e) -> HashSet e -> Bool #

onotElem :: Element (HashSet e) -> HashSet e -> Bool #

Hashable a => MonoPointed (HashSet a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (HashSet a) -> HashSet a #

(Eq v, Hashable v) => Container (HashSet v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (HashSet v) #

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 #

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 #

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)) #

safeMaximum :: HashSet v -> Maybe (Element (HashSet v)) #

safeMinimum :: HashSet v -> Maybe (Element (HashSet v)) #

safeFoldr1 :: (Element (HashSet v) -> Element (HashSet v) -> Element (HashSet v)) -> HashSet v -> Maybe (Element (HashSet v)) #

safeFoldl1 :: (Element (HashSet v) -> Element (HashSet v) -> Element (HashSet v)) -> HashSet v -> Maybe (Element (HashSet v)) #

Hashable v => One (HashSet v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (HashSet v) #

Methods

one :: OneItem (HashSet v) -> HashSet v #

type Item (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

type Item (HashSet a) = a
type ContainerKey (HashSet element) 
Instance details

Defined in Data.Containers

type ContainerKey (HashSet element) = element
type Element (HashSet e) 
Instance details

Defined in Data.MonoTraversable

type Element (HashSet e) = e
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

words :: Text -> [Text] #

O(n) Breaks a Text up into a list of words, delimited by Chars representing white space.

lines :: Text -> [Text] #

O(n) Breaks a Text up into a list of Texts at newline Chars. The resulting strings do not contain newlines.

unlines :: [Text] -> Text #

O(n) Joins lines, after appending a terminating newline to each.

unwords :: [Text] -> Text #

O(n) Joins words using single space characters.

data Set a #

A set of values a.

Instances

Instances details
ToJSON1 Set 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Value) -> ([a] -> Value) -> Set a -> Value #

liftToJSONList :: (a -> Value) -> ([a] -> Value) -> [Set a] -> Value #

liftToEncoding :: (a -> Encoding) -> ([a] -> Encoding) -> Set a -> Encoding #

liftToEncodingList :: (a -> Encoding) -> ([a] -> Encoding) -> [Set a] -> Encoding #

Foldable Set

Folds in order of increasing key.

Instance details

Defined in Data.Set.Internal

Methods

fold :: Monoid m => Set m -> m #

foldMap :: Monoid m => (a -> m) -> Set a -> m #

foldMap' :: Monoid m => (a -> m) -> Set a -> m #

foldr :: (a -> b -> b) -> b -> Set a -> b #

foldr' :: (a -> b -> b) -> b -> Set a -> b #

foldl :: (b -> a -> b) -> b -> Set a -> b #

foldl' :: (b -> a -> b) -> b -> Set a -> b #

foldr1 :: (a -> a -> a) -> Set a -> a #

foldl1 :: (a -> a -> a) -> Set a -> a #

toList :: Set a -> [a] #

null :: Set a -> Bool #

length :: Set a -> Int #

elem :: Eq a => a -> Set a -> Bool #

maximum :: Ord a => Set a -> a #

minimum :: Ord a => Set a -> a #

sum :: Num a => Set a -> a #

product :: Num a => Set a -> a #

Eq1 Set

Since: containers-0.5.9

Instance details

Defined in Data.Set.Internal

Methods

liftEq :: (a -> b -> Bool) -> Set a -> Set b -> Bool #

Ord1 Set

Since: containers-0.5.9

Instance details

Defined in Data.Set.Internal

Methods

liftCompare :: (a -> b -> Ordering) -> Set a -> Set b -> Ordering #

Show1 Set

Since: containers-0.5.9

Instance details

Defined in Data.Set.Internal

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Set a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Set a] -> ShowS #

Hashable1 Set

Since: hashable-1.3.4.0

Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> Set a -> Int #

(Ord a, FromJSON a) => FromJSON (Set a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Set a) #

parseJSONList :: Value -> Parser [Set a] #

ToJSON a => ToJSON (Set a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Set a -> Value #

toEncoding :: Set a -> Encoding #

toJSONList :: [Set a] -> Value #

toEncodingList :: [Set a] -> Encoding #

(Data a, Ord a) => Data (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Set a -> c (Set a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Set a) #

toConstr :: Set a -> Constr #

dataTypeOf :: Set a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Set a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Set a)) #

gmapT :: (forall b. Data b => b -> b) -> Set a -> Set a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Set a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Set a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Set a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Set a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Set a -> m (Set a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Set a -> m (Set a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Set a -> m (Set a) #

Ord a => Monoid (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

mempty :: Set a #

mappend :: Set a -> Set a -> Set a #

mconcat :: [Set a] -> Set a #

Ord a => Semigroup (Set a)

Since: containers-0.5.7

Instance details

Defined in Data.Set.Internal

Methods

(<>) :: Set a -> Set a -> Set a #

sconcat :: NonEmpty (Set a) -> Set a #

stimes :: Integral b => b -> Set a -> Set a #

Ord a => IsList (Set a)

Since: containers-0.5.6.2

Instance details

Defined in Data.Set.Internal

Associated Types

type Item (Set a) #

Methods

fromList :: [Item (Set a)] -> Set a #

fromListN :: Int -> [Item (Set a)] -> Set a #

toList :: Set a -> [Item (Set a)] #

(Read a, Ord a) => Read (Set a) 
Instance details

Defined in Data.Set.Internal

Show a => Show (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

showsPrec :: Int -> Set a -> ShowS #

show :: Set a -> String #

showList :: [Set a] -> ShowS #

NFData a => NFData (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

rnf :: Set a -> () #

Eq a => Eq (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

(==) :: Set a -> Set a -> Bool #

(/=) :: Set a -> Set a -> Bool #

Ord a => Ord (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

compare :: Set a -> Set a -> Ordering #

(<) :: Set a -> Set a -> Bool #

(<=) :: Set a -> Set a -> Bool #

(>) :: Set a -> Set a -> Bool #

(>=) :: Set a -> Set a -> Bool #

max :: Set a -> Set a -> Set a #

min :: Set a -> Set a -> Set a #

Hashable v => Hashable (Set v)

Since: hashable-1.3.4.0

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Set v -> Int #

hash :: Set v -> Int #

Ord element => IsSet (Set element) 
Instance details

Defined in Data.Containers

Methods

insertSet :: Element (Set element) -> Set element -> Set element #

deleteSet :: Element (Set element) -> Set element -> Set element #

singletonSet :: Element (Set element) -> Set element #

setFromList :: [Element (Set element)] -> Set element #

setToList :: Set element -> [Element (Set element)] #

filterSet :: (Element (Set element) -> Bool) -> Set element -> Set element #

Ord element => SetContainer (Set element) 
Instance details

Defined in Data.Containers

Associated Types

type ContainerKey (Set element) #

Methods

member :: ContainerKey (Set element) -> Set element -> Bool #

notMember :: ContainerKey (Set element) -> Set element -> Bool #

union :: Set element -> Set element -> Set element #

unions :: (MonoFoldable mono, Element mono ~ Set element) => mono -> Set element #

difference :: Set element -> Set element -> Set element #

intersection :: Set element -> Set element -> Set element #

keys :: Set element -> [ContainerKey (Set element)] #

Ord v => GrowingAppend (Set v) 
Instance details

Defined in Data.MonoTraversable

Ord e => MonoFoldable (Set e) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (Set e) -> m) -> Set e -> m #

ofoldr :: (Element (Set e) -> b -> b) -> b -> Set e -> b #

ofoldl' :: (a -> Element (Set e) -> a) -> a -> Set e -> a #

otoList :: Set e -> [Element (Set e)] #

oall :: (Element (Set e) -> Bool) -> Set e -> Bool #

oany :: (Element (Set e) -> Bool) -> Set e -> Bool #

onull :: Set e -> Bool #

olength :: Set e -> Int #

olength64 :: Set e -> Int64 #

ocompareLength :: Integral i => Set e -> i -> Ordering #

otraverse_ :: Applicative f => (Element (Set e) -> f b) -> Set e -> f () #

ofor_ :: Applicative f => Set e -> (Element (Set e) -> f b) -> f () #

omapM_ :: Applicative m => (Element (Set e) -> m ()) -> Set e -> m () #

oforM_ :: Applicative m => Set e -> (Element (Set e) -> m ()) -> m () #

ofoldlM :: Monad m => (a -> Element (Set e) -> m a) -> a -> Set e -> m a #

ofoldMap1Ex :: Semigroup m => (Element (Set e) -> m) -> Set e -> m #

ofoldr1Ex :: (Element (Set e) -> Element (Set e) -> Element (Set e)) -> Set e -> Element (Set e) #

ofoldl1Ex' :: (Element (Set e) -> Element (Set e) -> Element (Set e)) -> Set e -> Element (Set e) #

headEx :: Set e -> Element (Set e) #

lastEx :: Set e -> Element (Set e) #

unsafeHead :: Set e -> Element (Set e) #

unsafeLast :: Set e -> Element (Set e) #

maximumByEx :: (Element (Set e) -> Element (Set e) -> Ordering) -> Set e -> Element (Set e) #

minimumByEx :: (Element (Set e) -> Element (Set e) -> Ordering) -> Set e -> Element (Set e) #

oelem :: Element (Set e) -> Set e -> Bool #

onotElem :: Element (Set e) -> Set e -> Bool #

MonoPointed (Set a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Set a) -> Set a #

(Ord a, PersistField a) => PersistField (Set a) 
Instance details

Defined in Database.Persist.Class.PersistField

(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) #

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 #

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 #

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)) #

safeMaximum :: Set v -> Maybe (Element (Set v)) #

safeMinimum :: Set v -> Maybe (Element (Set v)) #

safeFoldr1 :: (Element (Set v) -> Element (Set v) -> Element (Set v)) -> Set v -> Maybe (Element (Set v)) #

safeFoldl1 :: (Element (Set v) -> Element (Set v) -> Element (Set v)) -> Set v -> Maybe (Element (Set v)) #

Ord a => FromList (Set a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type ListElement (Set a) #

type FromListC (Set a) #

Methods

fromList :: [ListElement (Set a)] -> Set a #

One (Set v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (Set v) #

Methods

one :: OneItem (Set v) -> Set v #

type Item (Set a) 
Instance details

Defined in Data.Set.Internal

type Item (Set a) = a
type ContainerKey (Set element) 
Instance details

Defined in Data.Containers

type ContainerKey (Set element) = element
type Element (Set e) 
Instance details

Defined in Data.MonoTraversable

type Element (Set e) = e
type Element (Set v) 
Instance details

Defined in Universum.Container.Class

type Element (Set v) = ElementDefault (Set v)
type FromListC (Set a) 
Instance details

Defined in Universum.Container.Class

type FromListC (Set a) = ()
type ListElement (Set a) 
Instance details

Defined in Universum.Container.Class

type ListElement (Set a) = Item (Set a)
type OneItem (Set v) 
Instance details

Defined in Universum.Container.Class

type OneItem (Set v) = v

data Seq a #

General-purpose finite sequences.

Instances

Instances details
FromJSON1 Seq 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (Seq a) #

liftParseJSONList :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [Seq a] #

ToJSON1 Seq 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Value) -> ([a] -> Value) -> Seq a -> Value #

liftToJSONList :: (a -> Value) -> ([a] -> Value) -> [Seq a] -> Value #

liftToEncoding :: (a -> Encoding) -> ([a] -> Encoding) -> Seq a -> Encoding #

liftToEncodingList :: (a -> Encoding) -> ([a] -> Encoding) -> [Seq a] -> Encoding #

MonadFix Seq

Since: containers-0.5.11

Instance details

Defined in Data.Sequence.Internal

Methods

mfix :: (a -> Seq a) -> Seq a #

MonadZip Seq
 mzipWith = zipWith
 munzip = unzip
Instance details

Defined in Data.Sequence.Internal

Methods

mzip :: Seq a -> Seq b -> Seq (a, b) #

mzipWith :: (a -> b -> c) -> Seq a -> Seq b -> Seq c #

munzip :: Seq (a, b) -> (Seq a, Seq b) #

Foldable Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

fold :: Monoid m => Seq m -> m #

foldMap :: Monoid m => (a -> m) -> Seq a -> m #

foldMap' :: Monoid m => (a -> m) -> Seq a -> m #

foldr :: (a -> b -> b) -> b -> Seq a -> b #

foldr' :: (a -> b -> b) -> b -> Seq a -> b #

foldl :: (b -> a -> b) -> b -> Seq a -> b #

foldl' :: (b -> a -> b) -> b -> Seq a -> b #

foldr1 :: (a -> a -> a) -> Seq a -> a #

foldl1 :: (a -> a -> a) -> Seq a -> a #

toList :: Seq a -> [a] #

null :: Seq a -> Bool #

length :: Seq a -> Int #

elem :: Eq a => a -> Seq a -> Bool #

maximum :: Ord a => Seq a -> a #

minimum :: Ord a => Seq a -> a #

sum :: Num a => Seq a -> a #

product :: Num a => Seq a -> a #

Eq1 Seq

Since: containers-0.5.9

Instance details

Defined in Data.Sequence.Internal

Methods

liftEq :: (a -> b -> Bool) -> Seq a -> Seq b -> Bool #

Ord1 Seq

Since: containers-0.5.9

Instance details

Defined in Data.Sequence.Internal

Methods

liftCompare :: (a -> b -> Ordering) -> Seq a -> Seq b -> Ordering #

Read1 Seq

Since: containers-0.5.9

Instance details

Defined in Data.Sequence.Internal

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (Seq a) #

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [Seq a] #

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (Seq a) #

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [Seq a] #

Show1 Seq

Since: containers-0.5.9

Instance details

Defined in Data.Sequence.Internal

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Seq a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Seq a] -> ShowS #

Traversable Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

traverse :: Applicative f => (a -> f b) -> Seq a -> f (Seq b) #

sequenceA :: Applicative f => Seq (f a) -> f (Seq a) #

mapM :: Monad m => (a -> m b) -> Seq a -> m (Seq b) #

sequence :: Monad m => Seq (m a) -> m (Seq a) #

Alternative Seq

Since: containers-0.5.4

Instance details

Defined in Data.Sequence.Internal

Methods

empty :: Seq a #

(<|>) :: Seq a -> Seq a -> Seq a #

some :: Seq a -> Seq [a] #

many :: Seq a -> Seq [a] #

Applicative Seq

Since: containers-0.5.4

Instance details

Defined in Data.Sequence.Internal

Methods

pure :: a -> Seq a #

(<*>) :: Seq (a -> b) -> Seq a -> Seq b #

liftA2 :: (a -> b -> c) -> Seq a -> Seq b -> Seq c #

(*>) :: Seq a -> Seq b -> Seq b #

(<*) :: Seq a -> Seq b -> Seq a #

Functor Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

fmap :: (a -> b) -> Seq a -> Seq b #

(<$) :: a -> Seq b -> Seq a #

Monad Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

(>>=) :: Seq a -> (a -> Seq b) -> Seq b #

(>>) :: Seq a -> Seq b -> Seq b #

return :: a -> Seq a #

MonadPlus Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

mzero :: Seq a #

mplus :: Seq a -> Seq a -> Seq a #

Zip Seq 
Instance details

Defined in Data.ChunkedZip

Methods

zipWith :: (a -> b -> c) -> Seq a -> Seq b -> Seq c #

zip :: Seq a -> Seq b -> Seq (a, b) #

zap :: Seq (a -> b) -> Seq a -> Seq b #

unzip :: Seq (a, b) -> (Seq a, Seq b) #

Zip3 Seq 
Instance details

Defined in Data.ChunkedZip

Methods

zipWith3 :: (a -> b -> c -> d) -> Seq a -> Seq b -> Seq c -> Seq d #

zip3 :: Seq a -> Seq b -> Seq c -> Seq (a, b, c) #

zap3 :: Seq (a -> b -> c) -> Seq a -> Seq b -> Seq c #

unzip3 :: Seq (a, b, c) -> (Seq a, Seq b, Seq c) #

Zip4 Seq 
Instance details

Defined in Data.ChunkedZip

Methods

zipWith4 :: (a -> b -> c -> d -> e) -> Seq a -> Seq b -> Seq c -> Seq d -> Seq e #

zip4 :: Seq a -> Seq b -> Seq c -> Seq d -> Seq (a, b, c, d) #

zap4 :: Seq (a -> b -> c -> d) -> Seq a -> Seq b -> Seq c -> Seq d #

unzip4 :: Seq (a, b, c, d) -> (Seq a, Seq b, Seq c, Seq d) #

UnzipWith Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

unzipWith' :: (x -> (a, b)) -> Seq x -> (Seq a, Seq b)

Hashable1 Seq

Since: hashable-1.3.4.0

Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> Seq a -> Int #

Adjustable Seq 
Instance details

Defined in Data.Key

Methods

adjust :: (a -> a) -> Key Seq -> Seq a -> Seq a #

replace :: Key Seq -> a -> Seq a -> Seq a #

FoldableWithKey Seq 
Instance details

Defined in Data.Key

Methods

toKeyedList :: Seq a -> [(Key Seq, a)] #

foldMapWithKey :: Monoid m => (Key Seq -> a -> m) -> Seq a -> m #

foldrWithKey :: (Key Seq -> a -> b -> b) -> b -> Seq a -> b #

foldlWithKey :: (b -> Key Seq -> a -> b) -> b -> Seq a -> b #

Indexable Seq 
Instance details

Defined in Data.Key

Methods

index :: Seq a -> Key Seq -> a #

Keyed Seq 
Instance details

Defined in Data.Key

Methods

mapWithKey :: (Key Seq -> a -> b) -> Seq a -> Seq b #

Lookup Seq 
Instance details

Defined in Data.Key

Methods

lookup :: Key Seq -> Seq a -> Maybe a #

TraversableWithKey Seq 
Instance details

Defined in Data.Key

Methods

traverseWithKey :: Applicative f => (Key Seq -> a -> f b) -> Seq a -> f (Seq b) #

mapWithKeyM :: Monad m => (Key Seq -> a -> m b) -> Seq a -> m (Seq b) #

Zip Seq 
Instance details

Defined in Data.Key

Methods

zipWith :: (a -> b -> c) -> Seq a -> Seq b -> Seq c #

zip :: Seq a -> Seq b -> Seq (a, b) #

zap :: Seq (a -> b) -> Seq a -> Seq b #

ZipWithKey Seq 
Instance details

Defined in Data.Key

Methods

zipWithKey :: (Key Seq -> a -> b -> c) -> Seq a -> Seq b -> Seq c #

zapWithKey :: Seq (Key Seq -> a -> b) -> Seq a -> Seq b #

Apply Seq 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(<.>) :: Seq (a -> b) -> Seq a -> Seq b #

(.>) :: Seq a -> Seq b -> Seq b #

(<.) :: Seq a -> Seq b -> Seq a #

liftF2 :: (a -> b -> c) -> Seq a -> Seq b -> Seq c #

Bind Seq 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(>>-) :: Seq a -> (a -> Seq b) -> Seq b #

join :: Seq (Seq a) -> 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 #

Data a => Data (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Seq a -> c (Seq a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Seq a) #

toConstr :: Seq a -> Constr #

dataTypeOf :: Seq a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Seq a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Seq a)) #

gmapT :: (forall b. Data b => b -> b) -> Seq a -> Seq a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Seq a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Seq a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Seq a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Seq a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Seq a -> m (Seq a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Seq a -> m (Seq a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Seq a -> m (Seq a) #

a ~ Char => IsString (Seq a)

Since: containers-0.5.7

Instance details

Defined in Data.Sequence.Internal

Methods

fromString :: String -> Seq a #

Monoid (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

mempty :: Seq a #

mappend :: Seq a -> Seq a -> Seq a #

mconcat :: [Seq a] -> Seq a #

Semigroup (Seq a)

Since: containers-0.5.7

Instance details

Defined in Data.Sequence.Internal

Methods

(<>) :: Seq a -> Seq a -> Seq a #

sconcat :: NonEmpty (Seq a) -> Seq a #

stimes :: Integral b => b -> Seq a -> Seq a #

IsList (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Associated Types

type Item (Seq a) #

Methods

fromList :: [Item (Seq a)] -> Seq a #

fromListN :: Int -> [Item (Seq a)] -> Seq a #

toList :: Seq a -> [Item (Seq a)] #

Read a => Read (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Show a => Show (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

showsPrec :: Int -> Seq a -> ShowS #

show :: Seq a -> String #

showList :: [Seq a] -> ShowS #

NFData a => NFData (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

rnf :: Seq a -> () #

Eq a => Eq (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

(==) :: Seq a -> Seq a -> Bool #

(/=) :: Seq a -> Seq a -> Bool #

Ord a => Ord (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

compare :: Seq a -> Seq a -> Ordering #

(<) :: Seq a -> Seq a -> Bool #

(<=) :: Seq a -> Seq a -> Bool #

(>) :: Seq a -> Seq a -> Bool #

(>=) :: Seq a -> Seq a -> Bool #

max :: Seq a -> Seq a -> Seq a #

min :: Seq a -> Seq a -> Seq a #

Hashable v => Hashable (Seq v)

Since: hashable-1.3.4.0

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Seq v -> Int #

hash :: Seq v -> Int #

GrowingAppend (Seq a) 
Instance details

Defined in Data.MonoTraversable

MonoFoldable (Seq a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (Seq a) -> m) -> Seq a -> m #

ofoldr :: (Element (Seq a) -> b -> b) -> b -> Seq a -> b #

ofoldl' :: (a0 -> Element (Seq a) -> a0) -> a0 -> Seq a -> a0 #

otoList :: Seq a -> [Element (Seq a)] #

oall :: (Element (Seq a) -> Bool) -> Seq a -> Bool #

oany :: (Element (Seq a) -> Bool) -> Seq a -> Bool #

onull :: Seq a -> Bool #

olength :: Seq a -> Int #

olength64 :: Seq a -> Int64 #

ocompareLength :: Integral i => Seq a -> i -> Ordering #

otraverse_ :: Applicative f => (Element (Seq a) -> f b) -> Seq a -> f () #

ofor_ :: Applicative f => Seq a -> (Element (Seq a) -> f b) -> f () #

omapM_ :: Applicative m => (Element (Seq a) -> m ()) -> Seq a -> m () #

oforM_ :: Applicative m => Seq a -> (Element (Seq a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (Seq a) -> m a0) -> a0 -> Seq a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (Seq a) -> m) -> Seq a -> m #

ofoldr1Ex :: (Element (Seq a) -> Element (Seq a) -> Element (Seq a)) -> Seq a -> Element (Seq a) #

ofoldl1Ex' :: (Element (Seq a) -> Element (Seq a) -> Element (Seq a)) -> Seq a -> Element (Seq a) #

headEx :: Seq a -> Element (Seq a) #

lastEx :: Seq a -> Element (Seq a) #

unsafeHead :: Seq a -> Element (Seq a) #

unsafeLast :: Seq a -> Element (Seq a) #

maximumByEx :: (Element (Seq a) -> Element (Seq a) -> Ordering) -> Seq a -> Element (Seq a) #

minimumByEx :: (Element (Seq a) -> Element (Seq a) -> Ordering) -> Seq a -> Element (Seq a) #

oelem :: Element (Seq a) -> Seq a -> Bool #

onotElem :: Element (Seq a) -> Seq a -> Bool #

MonoFunctor (Seq a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Seq a) -> Element (Seq a)) -> Seq a -> Seq a #

MonoPointed (Seq a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Seq a) -> Seq a #

MonoTraversable (Seq a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (Seq a) -> f (Element (Seq a))) -> Seq a -> f (Seq a) #

omapM :: Applicative m => (Element (Seq a) -> m (Element (Seq a))) -> Seq a -> m (Seq a) #

IsSequence (Seq a) 
Instance details

Defined in Data.Sequences

Methods

fromList :: [Element (Seq a)] -> Seq a #

lengthIndex :: Seq a -> Index (Seq a) #

break :: (Element (Seq a) -> Bool) -> Seq a -> (Seq a, Seq a) #

span :: (Element (Seq a) -> Bool) -> Seq a -> (Seq a, Seq a) #

dropWhile :: (Element (Seq a) -> Bool) -> Seq a -> Seq a #

takeWhile :: (Element (Seq a) -> Bool) -> Seq a -> Seq a #

splitAt :: Index (Seq a) -> Seq a -> (Seq a, Seq a) #

unsafeSplitAt :: Index (Seq a) -> Seq a -> (Seq a, Seq a) #

take :: Index (Seq a) -> Seq a -> Seq a #

unsafeTake :: Index (Seq a) -> Seq a -> Seq a #

drop :: Index (Seq a) -> Seq a -> Seq a #

unsafeDrop :: Index (Seq a) -> Seq a -> Seq a #

dropEnd :: Index (Seq a) -> Seq a -> Seq a #

partition :: (Element (Seq a) -> Bool) -> Seq a -> (Seq a, Seq a) #

uncons :: Seq a -> Maybe (Element (Seq a), Seq a) #

unsnoc :: Seq a -> Maybe (Seq a, Element (Seq a)) #

filter :: (Element (Seq a) -> Bool) -> Seq a -> Seq a #

filterM :: Monad m => (Element (Seq a) -> m Bool) -> Seq a -> m (Seq a) #

replicate :: Index (Seq a) -> Element (Seq a) -> Seq a #

replicateM :: Monad m => Index (Seq a) -> m (Element (Seq a)) -> m (Seq a) #

groupBy :: (Element (Seq a) -> Element (Seq a) -> Bool) -> Seq a -> [Seq a] #

groupAllOn :: Eq b => (Element (Seq a) -> b) -> Seq a -> [Seq a] #

subsequences :: Seq a -> [Seq a] #

permutations :: Seq a -> [Seq a] #

tailEx :: Seq a -> Seq a #

tailMay :: Seq a -> Maybe (Seq a) #

initEx :: Seq a -> Seq a #

initMay :: Seq a -> Maybe (Seq a) #

unsafeTail :: Seq a -> Seq a #

unsafeInit :: Seq a -> Seq a #

index :: Seq a -> Index (Seq a) -> Maybe (Element (Seq a)) #

indexEx :: Seq a -> Index (Seq a) -> Element (Seq a) #

unsafeIndex :: Seq a -> Index (Seq a) -> Element (Seq a) #

splitWhen :: (Element (Seq a) -> Bool) -> Seq a -> [Seq a] #

SemiSequence (Seq a) 
Instance details

Defined in Data.Sequences

Associated Types

type Index (Seq a) #

Methods

intersperse :: Element (Seq a) -> Seq a -> Seq a #

reverse :: Seq a -> Seq a #

find :: (Element (Seq a) -> Bool) -> Seq a -> Maybe (Element (Seq a)) #

sortBy :: (Element (Seq a) -> Element (Seq a) -> Ordering) -> Seq a -> Seq a #

cons :: Element (Seq a) -> Seq a -> Seq a #

snoc :: Seq a -> Element (Seq a) -> Seq a #

Container (Seq a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Seq a) #

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 #

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 #

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)) #

safeMaximum :: Seq a -> Maybe (Element (Seq a)) #

safeMinimum :: Seq a -> Maybe (Element (Seq a)) #

safeFoldr1 :: (Element (Seq a) -> Element (Seq a) -> Element (Seq a)) -> Seq a -> Maybe (Element (Seq a)) #

safeFoldl1 :: (Element (Seq a) -> Element (Seq a) -> Element (Seq a)) -> Seq a -> Maybe (Element (Seq a)) #

FromList (Seq a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type ListElement (Seq a) #

type FromListC (Seq a) #

Methods

fromList :: [ListElement (Seq a)] -> Seq a #

One (Seq a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (Seq a) #

Methods

one :: OneItem (Seq a) -> Seq a #

type Key Seq 
Instance details

Defined in Data.Key

type Key Seq = Int
type Item (Seq a) 
Instance details

Defined in Data.Sequence.Internal

type Item (Seq a) = a
type Element (Seq a) 
Instance details

Defined in Data.MonoTraversable

type Element (Seq a) = a
type Index (Seq a) 
Instance details

Defined in Data.Sequences

type Index (Seq a) = Int
type Element (Seq a) 
Instance details

Defined in Universum.Container.Class

type Element (Seq a) = ElementDefault (Seq a)
type FromListC (Seq a) 
Instance details

Defined in Universum.Container.Class

type FromListC (Seq a) = ()
type ListElement (Seq a) 
Instance details

Defined in Universum.Container.Class

type ListElement (Seq a) = Item (Seq a)
type OneItem (Seq a) 
Instance details

Defined in Universum.Container.Class

type OneItem (Seq a) = a

data IntSet #

A set of integers.

Instances

Instances details
FromJSON IntSet 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON IntSet 
Instance details

Defined in Data.Aeson.Types.ToJSON

Data IntSet 
Instance details

Defined in Data.IntSet.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IntSet -> c IntSet #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IntSet #

toConstr :: IntSet -> Constr #

dataTypeOf :: IntSet -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IntSet) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IntSet) #

gmapT :: (forall b. Data b => b -> b) -> IntSet -> IntSet #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IntSet -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IntSet -> r #

gmapQ :: (forall d. Data d => d -> u) -> IntSet -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IntSet -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IntSet -> m IntSet #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IntSet -> m IntSet #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IntSet -> m IntSet #

Monoid IntSet 
Instance details

Defined in Data.IntSet.Internal

Semigroup IntSet

Since: containers-0.5.7

Instance details

Defined in Data.IntSet.Internal

IsList IntSet

Since: containers-0.5.6.2

Instance details

Defined in Data.IntSet.Internal

Associated Types

type Item IntSet #

Read IntSet 
Instance details

Defined in Data.IntSet.Internal

Show IntSet 
Instance details

Defined in Data.IntSet.Internal

NFData IntSet 
Instance details

Defined in Data.IntSet.Internal

Methods

rnf :: IntSet -> () #

Eq IntSet 
Instance details

Defined in Data.IntSet.Internal

Methods

(==) :: IntSet -> IntSet -> Bool #

(/=) :: IntSet -> IntSet -> Bool #

Ord IntSet 
Instance details

Defined in Data.IntSet.Internal

Hashable IntSet

Since: hashable-1.3.4.0

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> IntSet -> Int #

hash :: IntSet -> Int #

IsSet IntSet 
Instance details

Defined in Data.Containers

SetContainer IntSet 
Instance details

Defined in Data.Containers

Associated Types

type ContainerKey IntSet #

GrowingAppend IntSet 
Instance details

Defined in Data.MonoTraversable

MonoFoldable IntSet 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element IntSet -> m) -> IntSet -> m #

ofoldr :: (Element IntSet -> b -> b) -> b -> IntSet -> b #

ofoldl' :: (a -> Element IntSet -> a) -> a -> IntSet -> a #

otoList :: IntSet -> [Element IntSet] #

oall :: (Element IntSet -> Bool) -> IntSet -> Bool #

oany :: (Element IntSet -> Bool) -> IntSet -> Bool #

onull :: IntSet -> Bool #

olength :: IntSet -> Int #

olength64 :: IntSet -> Int64 #

ocompareLength :: Integral i => IntSet -> i -> Ordering #

otraverse_ :: Applicative f => (Element IntSet -> f b) -> IntSet -> f () #

ofor_ :: Applicative f => IntSet -> (Element IntSet -> f b) -> f () #

omapM_ :: Applicative m => (Element IntSet -> m ()) -> IntSet -> m () #

oforM_ :: Applicative m => IntSet -> (Element IntSet -> m ()) -> m () #

ofoldlM :: Monad m => (a -> Element IntSet -> m a) -> a -> IntSet -> m a #

ofoldMap1Ex :: Semigroup m => (Element IntSet -> m) -> IntSet -> m #

ofoldr1Ex :: (Element IntSet -> Element IntSet -> Element IntSet) -> IntSet -> Element IntSet #

ofoldl1Ex' :: (Element IntSet -> Element IntSet -> Element IntSet) -> IntSet -> Element IntSet #

headEx :: IntSet -> Element IntSet #

lastEx :: IntSet -> Element IntSet #

unsafeHead :: IntSet -> Element IntSet #

unsafeLast :: IntSet -> Element IntSet #

maximumByEx :: (Element IntSet -> Element IntSet -> Ordering) -> IntSet -> Element IntSet #

minimumByEx :: (Element IntSet -> Element IntSet -> Ordering) -> IntSet -> Element IntSet #

oelem :: Element IntSet -> IntSet -> Bool #

onotElem :: Element IntSet -> IntSet -> Bool #

MonoPointed IntSet 
Instance details

Defined in Data.MonoTraversable

Container IntSet 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element IntSet #

FromList IntSet 
Instance details

Defined in Universum.Container.Class

Associated Types

type ListElement IntSet #

type FromListC IntSet #

One IntSet 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem IntSet #

Methods

one :: OneItem IntSet -> IntSet #

type Item IntSet 
Instance details

Defined in Data.IntSet.Internal

type Item IntSet = Key
type ContainerKey IntSet 
Instance details

Defined in Data.Containers

type Element IntSet 
Instance details

Defined in Data.MonoTraversable

type Element IntSet 
Instance details

Defined in Universum.Container.Class

type FromListC IntSet 
Instance details

Defined in Universum.Container.Class

type FromListC IntSet = ()
type ListElement IntSet 
Instance details

Defined in Universum.Container.Class

type OneItem IntSet 
Instance details

Defined in Universum.Container.Class

data IntMap a #

A map of integers to values a.

Instances

Instances details
FromJSON1 IntMap 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (IntMap a) #

liftParseJSONList :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [IntMap a] #

ToJSON1 IntMap 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Value) -> ([a] -> Value) -> IntMap a -> Value #

liftToJSONList :: (a -> Value) -> ([a] -> Value) -> [IntMap a] -> Value #

liftToEncoding :: (a -> Encoding) -> ([a] -> Encoding) -> IntMap a -> Encoding #

liftToEncodingList :: (a -> Encoding) -> ([a] -> Encoding) -> [IntMap a] -> Encoding #

Foldable IntMap

Folds in order of increasing key.

Instance details

Defined in Data.IntMap.Internal

Methods

fold :: Monoid m => IntMap m -> m #

foldMap :: Monoid m => (a -> m) -> IntMap a -> m #

foldMap' :: Monoid m => (a -> m) -> IntMap a -> m #

foldr :: (a -> b -> b) -> b -> IntMap a -> b #

foldr' :: (a -> b -> b) -> b -> IntMap a -> b #

foldl :: (b -> a -> b) -> b -> IntMap a -> b #

foldl' :: (b -> a -> b) -> b -> IntMap a -> b #

foldr1 :: (a -> a -> a) -> IntMap a -> a #

foldl1 :: (a -> a -> a) -> IntMap a -> a #

toList :: IntMap a -> [a] #

null :: IntMap a -> Bool #

length :: IntMap a -> Int #

elem :: Eq a => a -> IntMap a -> Bool #

maximum :: Ord a => IntMap a -> a #

minimum :: Ord a => IntMap a -> a #

sum :: Num a => IntMap a -> a #

product :: Num a => IntMap a -> a #

Eq1 IntMap

Since: containers-0.5.9

Instance details

Defined in Data.IntMap.Internal

Methods

liftEq :: (a -> b -> Bool) -> IntMap a -> IntMap b -> Bool #

Ord1 IntMap

Since: containers-0.5.9

Instance details

Defined in Data.IntMap.Internal

Methods

liftCompare :: (a -> b -> Ordering) -> IntMap a -> IntMap b -> Ordering #

Read1 IntMap

Since: containers-0.5.9

Instance details

Defined in Data.IntMap.Internal

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (IntMap a) #

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [IntMap a] #

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (IntMap a) #

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [IntMap a] #

Show1 IntMap

Since: containers-0.5.9

Instance details

Defined in Data.IntMap.Internal

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> IntMap a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [IntMap a] -> ShowS #

Traversable IntMap

Traverses in order of increasing key.

Instance details

Defined in Data.IntMap.Internal

Methods

traverse :: Applicative f => (a -> f b) -> IntMap a -> f (IntMap b) #

sequenceA :: Applicative f => IntMap (f a) -> f (IntMap a) #

mapM :: Monad m => (a -> m b) -> IntMap a -> m (IntMap b) #

sequence :: Monad m => IntMap (m a) -> m (IntMap a) #

Functor IntMap 
Instance details

Defined in Data.IntMap.Internal

Methods

fmap :: (a -> b) -> IntMap a -> IntMap b #

(<$) :: a -> IntMap b -> IntMap a #

Zip IntMap 
Instance details

Defined in Data.ChunkedZip

Methods

zipWith :: (a -> b -> c) -> IntMap a -> IntMap b -> IntMap c #

zip :: IntMap a -> IntMap b -> IntMap (a, b) #

zap :: IntMap (a -> b) -> IntMap a -> IntMap b #

unzip :: IntMap (a, b) -> (IntMap a, IntMap b) #

Hashable1 IntMap

Since: hashable-1.3.4.0

Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> IntMap a -> Int #

Adjustable IntMap 
Instance details

Defined in Data.Key

Methods

adjust :: (a -> a) -> Key IntMap -> IntMap a -> IntMap a #

replace :: Key IntMap -> a -> IntMap a -> IntMap a #

FoldableWithKey IntMap 
Instance details

Defined in Data.Key

Methods

toKeyedList :: IntMap a -> [(Key IntMap, a)] #

foldMapWithKey :: Monoid m => (Key IntMap -> a -> m) -> IntMap a -> m #

foldrWithKey :: (Key IntMap -> a -> b -> b) -> b -> IntMap a -> b #

foldlWithKey :: (b -> Key IntMap -> a -> b) -> b -> IntMap a -> b #

Indexable IntMap 
Instance details

Defined in Data.Key

Methods

index :: IntMap a -> Key IntMap -> a #

Keyed IntMap 
Instance details

Defined in Data.Key

Methods

mapWithKey :: (Key IntMap -> a -> b) -> IntMap a -> IntMap b #

Lookup IntMap 
Instance details

Defined in Data.Key

Methods

lookup :: Key IntMap -> IntMap a -> Maybe a #

TraversableWithKey IntMap 
Instance details

Defined in Data.Key

Methods

traverseWithKey :: Applicative f => (Key IntMap -> a -> f b) -> IntMap a -> f (IntMap b) #

mapWithKeyM :: Monad m => (Key IntMap -> a -> m b) -> IntMap a -> m (IntMap b) #

Zip IntMap 
Instance details

Defined in Data.Key

Methods

zipWith :: (a -> b -> c) -> IntMap a -> IntMap b -> IntMap c #

zip :: IntMap a -> IntMap b -> IntMap (a, b) #

zap :: IntMap (a -> b) -> IntMap a -> IntMap b #

ZipWithKey IntMap 
Instance details

Defined in Data.Key

Methods

zipWithKey :: (Key IntMap -> a -> b -> c) -> IntMap a -> IntMap b -> IntMap c #

zapWithKey :: IntMap (Key IntMap -> a -> b) -> IntMap a -> IntMap b #

PolyMap IntMap

This instance uses the functions from Data.IntMap.Strict.

Instance details

Defined in Data.Containers

Methods

differenceMap :: IntMap value1 -> IntMap value2 -> IntMap value1 #

intersectionMap :: IntMap value1 -> IntMap value2 -> IntMap value1 #

intersectionWithMap :: (value1 -> value2 -> value3) -> IntMap value1 -> IntMap value2 -> IntMap value3 #

Apply IntMap

An IntMap is not Applicative, but it is an instance of Apply

Instance details

Defined in Data.Functor.Bind.Class

Methods

(<.>) :: IntMap (a -> b) -> IntMap a -> IntMap b #

(.>) :: IntMap a -> IntMap b -> IntMap b #

(<.) :: IntMap a -> IntMap b -> IntMap a #

liftF2 :: (a -> b -> c) -> IntMap a -> IntMap b -> IntMap c #

Bind IntMap

An IntMap is not a Monad, but it is an instance of Bind

Instance details

Defined in Data.Functor.Bind.Class

Methods

(>>-) :: IntMap a -> (a -> IntMap b) -> IntMap b #

join :: IntMap (IntMap a) -> IntMap a #

FromJSON a => FromJSON (IntMap a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON a => ToJSON (IntMap a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Data a => Data (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IntMap a -> c (IntMap a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (IntMap a) #

toConstr :: IntMap a -> Constr #

dataTypeOf :: IntMap a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (IntMap a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (IntMap a)) #

gmapT :: (forall b. Data b => b -> b) -> IntMap a -> IntMap a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IntMap a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IntMap a -> r #

gmapQ :: (forall d. Data d => d -> u) -> IntMap a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IntMap a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IntMap a -> m (IntMap a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IntMap a -> m (IntMap a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IntMap a -> m (IntMap a) #

Monoid (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

mempty :: IntMap a #

mappend :: IntMap a -> IntMap a -> IntMap a #

mconcat :: [IntMap a] -> IntMap a #

Semigroup (IntMap a)

Since: containers-0.5.7

Instance details

Defined in Data.IntMap.Internal

Methods

(<>) :: IntMap a -> IntMap a -> IntMap a #

sconcat :: NonEmpty (IntMap a) -> IntMap a #

stimes :: Integral b => b -> IntMap a -> IntMap a #

IsList (IntMap a)

Since: containers-0.5.6.2

Instance details

Defined in Data.IntMap.Internal

Associated Types

type Item (IntMap a) #

Methods

fromList :: [Item (IntMap a)] -> IntMap a #

fromListN :: Int -> [Item (IntMap a)] -> IntMap a #

toList :: IntMap a -> [Item (IntMap a)] #

Read e => Read (IntMap e) 
Instance details

Defined in Data.IntMap.Internal

Show a => Show (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

showsPrec :: Int -> IntMap a -> ShowS #

show :: IntMap a -> String #

showList :: [IntMap a] -> ShowS #

NFData a => NFData (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

rnf :: IntMap a -> () #

Eq a => Eq (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

(==) :: IntMap a -> IntMap a -> Bool #

(/=) :: IntMap a -> IntMap a -> Bool #

Ord a => Ord (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

compare :: IntMap a -> IntMap a -> Ordering #

(<) :: IntMap a -> IntMap a -> Bool #

(<=) :: IntMap a -> IntMap a -> Bool #

(>) :: IntMap a -> IntMap a -> Bool #

(>=) :: IntMap a -> IntMap a -> Bool #

max :: IntMap a -> IntMap a -> IntMap a #

min :: IntMap a -> IntMap a -> IntMap a #

Hashable v => Hashable (IntMap v)

Since: hashable-1.3.4.0

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> IntMap v -> Int #

hash :: IntMap v -> Int #

HasKeysSet (IntMap v) 
Instance details

Defined in Data.Containers

Associated Types

type KeySet (IntMap v) #

Methods

keysSet :: IntMap v -> KeySet (IntMap v) #

IsMap (IntMap value)

This instance uses the functions from Data.IntMap.Strict.

Instance details

Defined in Data.Containers

Associated Types

type MapValue (IntMap value) #

Methods

lookup :: ContainerKey (IntMap value) -> IntMap value -> Maybe (MapValue (IntMap value)) #

insertMap :: ContainerKey (IntMap value) -> MapValue (IntMap value) -> IntMap value -> IntMap value #

deleteMap :: ContainerKey (IntMap value) -> IntMap value -> IntMap value #

singletonMap :: ContainerKey (IntMap value) -> MapValue (IntMap value) -> IntMap value #

mapFromList :: [(ContainerKey (IntMap value), MapValue (IntMap value))] -> IntMap value #

mapToList :: IntMap value -> [(ContainerKey (IntMap value), MapValue (IntMap value))] #

findWithDefault :: MapValue (IntMap value) -> ContainerKey (IntMap value) -> IntMap value -> MapValue (IntMap value) #

insertWith :: (MapValue (IntMap value) -> MapValue (IntMap value) -> MapValue (IntMap value)) -> ContainerKey (IntMap value) -> MapValue (IntMap value) -> IntMap value -> IntMap value #

insertWithKey :: (ContainerKey (IntMap value) -> MapValue (IntMap value) -> MapValue (IntMap value) -> MapValue (IntMap value)) -> ContainerKey (IntMap value) -> MapValue (IntMap value) -> IntMap value -> IntMap value #

insertLookupWithKey :: (ContainerKey (IntMap value) -> MapValue (IntMap value) -> MapValue (IntMap value) -> MapValue (IntMap value)) -> ContainerKey (IntMap value) -> MapValue (IntMap value) -> IntMap value -> (Maybe (MapValue (IntMap value)), IntMap value) #

adjustMap :: (MapValue (IntMap value) -> MapValue (IntMap value)) -> ContainerKey (IntMap value) -> IntMap value -> IntMap value #

adjustWithKey :: (ContainerKey (IntMap value) -> MapValue (IntMap value) -> MapValue (IntMap value)) -> ContainerKey (IntMap value) -> IntMap value -> IntMap value #

updateMap :: (MapValue (IntMap value) -> Maybe (MapValue (IntMap value))) -> ContainerKey (IntMap value) -> IntMap value -> IntMap value #

updateWithKey :: (ContainerKey (IntMap value) -> MapValue (IntMap value) -> Maybe (MapValue (IntMap value))) -> ContainerKey (IntMap value) -> IntMap value -> IntMap value #

updateLookupWithKey :: (ContainerKey (IntMap value) -> MapValue (IntMap value) -> Maybe (MapValue (IntMap value))) -> ContainerKey (IntMap value) -> IntMap value -> (Maybe (MapValue (IntMap value)), IntMap value) #

alterMap :: (Maybe (MapValue (IntMap value)) -> Maybe (MapValue (IntMap value))) -> ContainerKey (IntMap value) -> IntMap value -> IntMap value #

unionWith :: (MapValue (IntMap value) -> MapValue (IntMap value) -> MapValue (IntMap value)) -> IntMap value -> IntMap value -> IntMap value #

unionWithKey :: (ContainerKey (IntMap value) -> MapValue (IntMap value) -> MapValue (IntMap value) -> MapValue (IntMap value)) -> IntMap value -> IntMap value -> IntMap value #

unionsWith :: (MapValue (IntMap value) -> MapValue (IntMap value) -> MapValue (IntMap value)) -> [IntMap value] -> IntMap value #

mapWithKey :: (ContainerKey (IntMap value) -> MapValue (IntMap value) -> MapValue (IntMap value)) -> IntMap value -> IntMap value #

omapKeysWith :: (MapValue (IntMap value) -> MapValue (IntMap value) -> MapValue (IntMap value)) -> (ContainerKey (IntMap value) -> ContainerKey (IntMap value)) -> IntMap value -> IntMap value #

filterMap :: (MapValue (IntMap value) -> Bool) -> IntMap value -> IntMap value #

SetContainer (IntMap value)

This instance uses the functions from Data.IntMap.Strict.

Instance details

Defined in Data.Containers

Associated Types

type ContainerKey (IntMap value) #

Methods

member :: ContainerKey (IntMap value) -> IntMap value -> Bool #

notMember :: ContainerKey (IntMap value) -> IntMap value -> Bool #

union :: IntMap value -> IntMap value -> IntMap value #

unions :: (MonoFoldable mono, Element mono ~ IntMap value) => mono -> IntMap value #

difference :: IntMap value -> IntMap value -> IntMap value #

intersection :: IntMap value -> IntMap value -> IntMap value #

keys :: IntMap value -> [ContainerKey (IntMap value)] #

GrowingAppend (IntMap v) 
Instance details

Defined in Data.MonoTraversable

MonoFoldable (IntMap a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (IntMap a) -> m) -> IntMap a -> m #

ofoldr :: (Element (IntMap a) -> b -> b) -> b -> IntMap a -> b #

ofoldl' :: (a0 -> Element (IntMap a) -> a0) -> a0 -> IntMap a -> a0 #

otoList :: IntMap a -> [Element (IntMap a)] #

oall :: (Element (IntMap a) -> Bool) -> IntMap a -> Bool #

oany :: (Element (IntMap a) -> Bool) -> IntMap a -> Bool #

onull :: IntMap a -> Bool #

olength :: IntMap a -> Int #

olength64 :: IntMap a -> Int64 #

ocompareLength :: Integral i => IntMap a -> i -> Ordering #

otraverse_ :: Applicative f => (Element (IntMap a) -> f b) -> IntMap a -> f () #

ofor_ :: Applicative f => IntMap a -> (Element (IntMap a) -> f b) -> f () #

omapM_ :: Applicative m => (Element (IntMap a) -> m ()) -> IntMap a -> m () #

oforM_ :: Applicative m => IntMap a -> (Element (IntMap a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (IntMap a) -> m a0) -> a0 -> IntMap a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (IntMap a) -> m) -> IntMap a -> m #

ofoldr1Ex :: (Element (IntMap a) -> Element (IntMap a) -> Element (IntMap a)) -> IntMap a -> Element (IntMap a) #

ofoldl1Ex' :: (Element (IntMap a) -> Element (IntMap a) -> Element (IntMap a)) -> IntMap a -> Element (IntMap a) #

headEx :: IntMap a -> Element (IntMap a) #

lastEx :: IntMap a -> Element (IntMap a) #

unsafeHead :: IntMap a -> Element (IntMap a) #

unsafeLast :: IntMap a -> Element (IntMap a) #

maximumByEx :: (Element (IntMap a) -> Element (IntMap a) -> Ordering) -> IntMap a -> Element (IntMap a) #

minimumByEx :: (Element (IntMap a) -> Element (IntMap a) -> Ordering) -> IntMap a -> Element (IntMap a) #

oelem :: Element (IntMap a) -> IntMap a -> Bool #

onotElem :: Element (IntMap a) -> IntMap a -> Bool #

MonoFunctor (IntMap a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (IntMap a) -> Element (IntMap a)) -> IntMap a -> IntMap a #

MonoTraversable (IntMap a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (IntMap a) -> f (Element (IntMap a))) -> IntMap a -> f (IntMap a) #

omapM :: Applicative m => (Element (IntMap a) -> m (Element (IntMap a))) -> IntMap a -> m (IntMap a) #

PersistField v => PersistField (IntMap v) 
Instance details

Defined in Database.Persist.Class.PersistField

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) #

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 #

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 #

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)) #

safeMaximum :: IntMap v -> Maybe (Element (IntMap v)) #

safeMinimum :: IntMap v -> Maybe (Element (IntMap v)) #

safeFoldr1 :: (Element (IntMap v) -> Element (IntMap v) -> Element (IntMap v)) -> IntMap v -> Maybe (Element (IntMap v)) #

safeFoldl1 :: (Element (IntMap v) -> Element (IntMap v) -> Element (IntMap v)) -> IntMap v -> Maybe (Element (IntMap v)) #

FromList (IntMap v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type ListElement (IntMap v) #

type FromListC (IntMap v) #

Methods

fromList :: [ListElement (IntMap v)] -> IntMap v #

One (IntMap v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (IntMap v) #

Methods

one :: OneItem (IntMap v) -> IntMap v #

ToPairs (IntMap v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Key (IntMap v) #

type Val (IntMap v) #

Methods

toPairs :: IntMap v -> [(Key (IntMap v), Val (IntMap v))] #

keys :: IntMap v -> [Key (IntMap v)] #

elems :: IntMap v -> [Val (IntMap v)] #

type Key IntMap 
Instance details

Defined in Data.Key

type Key IntMap = Int
type Item (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

type Item (IntMap a) = (Key, a)
type ContainerKey (IntMap value) 
Instance details

Defined in Data.Containers

type ContainerKey (IntMap value) = Int
type KeySet (IntMap v) 
Instance details

Defined in Data.Containers

type KeySet (IntMap v) = IntSet
type MapValue (IntMap value) 
Instance details

Defined in Data.Containers

type MapValue (IntMap value) = value
type Element (IntMap a) 
Instance details

Defined in Data.MonoTraversable

type Element (IntMap a) = a
type Element (IntMap v) 
Instance details

Defined in Universum.Container.Class

type Element (IntMap v) = ElementDefault (IntMap v)
type FromListC (IntMap v) 
Instance details

Defined in Universum.Container.Class

type FromListC (IntMap v) = ()
type Key (IntMap v) 
Instance details

Defined in Universum.Container.Class

type Key (IntMap v) = Int
type ListElement (IntMap v) 
Instance details

Defined in Universum.Container.Class

type ListElement (IntMap v) = Item (IntMap v)
type OneItem (IntMap v) 
Instance details

Defined in Universum.Container.Class

type OneItem (IntMap v) = (Int, v)
type Val (IntMap v) 
Instance details

Defined in Universum.Container.Class

type Val (IntMap v) = v

camel :: String -> String #

Directly convert to camelCase through fromAny

stopwatch :: IO a -> IO (Timespan, a) #

Measures the time it takes to run an action and evaluate its result to WHNF. This measurement uses a monotonic clock instead of the standard system clock.

newtype Timespan #

A timespan. This is represented internally as a number of nanoseconds.

Constructors

Timespan 

Fields

Instances

Instances details
FromJSON Timespan 
Instance details

Defined in Chronos

ToJSON Timespan 
Instance details

Defined in Chronos

Monoid Timespan 
Instance details

Defined in Chronos

Semigroup Timespan 
Instance details

Defined in Chronos

Read Timespan 
Instance details

Defined in Chronos

Show Timespan 
Instance details

Defined in Chronos

NFData Timespan 
Instance details

Defined in Chronos

Methods

rnf :: Timespan -> () #

Eq Timespan 
Instance details

Defined in Chronos

Ord Timespan 
Instance details

Defined in Chronos

Additive Timespan 
Instance details

Defined in Chronos

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 #

bracket :: MonadUnliftIO m => m a -> (a -> m b) -> (a -> m c) -> m c #

Allocate and clean up a resource safely.

For more information on motivation and usage of this function, see base's bracket. This function has two differences from the one in base. The first, and more obvious, is that it works on any MonadUnliftIO instance, not just IO.

The more subtle difference is that this function will use uninterruptible masking for its cleanup handler. This is a subtle distinction, but at a high level, means that resource cleanup has more guarantees to complete. This comes at the cost that an incorrectly written cleanup function cannot be interrupted.

For more information, please see https://github.com/fpco/safe-exceptions/issues/3.

Since: unliftio-0.1.0.0

finally #

Arguments

:: MonadUnliftIO m 
=> m a

thing

-> m b

after

-> m a 

Perform thing, guaranteeing that after will run after, even if an exception occurs.

Same interruptible vs uninterrupible points apply as with bracket. See base's finally for more information.

Since: unliftio-0.1.0.0

race :: MonadUnliftIO m => m a -> m b -> m (Either a b) #

Unlifted race.

Since: unliftio-0.1.0.0

withUnliftIO :: MonadUnliftIO m => (UnliftIO m -> IO a) -> m a #

Convenience function for capturing the monadic context and running an IO action. The UnliftIO newtype wrapper is rarely needed, so prefer withRunInIO to this function.

Since: unliftio-core-0.1.0.0

askRunInIO :: MonadUnliftIO m => m (m a -> IO a) #

Same as askUnliftIO, but returns a monomorphic function instead of a polymorphic newtype wrapper. If you only need to apply the transformation on one concrete type, this function can be more convenient.

Since: unliftio-core-0.1.0.0

newtype UnliftIO (m :: Type -> Type) #

The ability to run any monadic action m a as IO a.

This is more precisely a natural transformation. We need to new datatype (instead of simply using a forall) due to lack of support in GHC for impredicative types.

Since: unliftio-core-0.1.0.0

Constructors

UnliftIO 

Fields

class MonadIO m => MonadUnliftIO (m :: Type -> Type) where #

Monads which allow their actions to be run in IO.

While MonadIO allows an IO action to be lifted into another monad, this class captures the opposite concept: allowing you to capture the monadic context. Note that, in order to meet the laws given below, the intuition is that a monad must have no monadic state, but may have monadic context. This essentially limits MonadUnliftIO to ReaderT and IdentityT transformers on top of IO.

Laws. For any value u returned by askUnliftIO, it must meet the monad transformer laws as reformulated for MonadUnliftIO:

  • unliftIO u . return = return
  • unliftIO u (m >>= f) = unliftIO u m >>= unliftIO u . f

Instances of MonadUnliftIO must also satisfy the idempotency law:

  • askUnliftIO >>= \u -> (liftIO . unliftIO u) m = m

This law showcases two properties. First, askUnliftIO doesn't change the monadic context, and second, liftIO . unliftIO u is equivalent to id IF called in the same monadic context as askUnliftIO.

Since: unliftio-core-0.1.0.0

Methods

withRunInIO :: ((forall a. m a -> IO a) -> IO b) -> m b #

Convenience function for capturing the monadic context and running an IO action with a runner function. The runner function is used to run a monadic action m in IO.

Since: unliftio-core-0.1.0.0

Instances

Instances details
MonadUnliftIO IO 
Instance details

Defined in Control.Monad.IO.Unlift

Methods

withRunInIO :: ((forall a. IO a -> IO a) -> IO b) -> IO b #

MonadUnliftIO m => MonadUnliftIO (AppM m) Source # 
Instance details

Defined in BtcLsp.Data.AppM

Methods

withRunInIO :: ((forall a. AppM m a -> IO a) -> IO b) -> AppM m b #

MonadUnliftIO m => MonadUnliftIO (KatipT m) 
Instance details

Defined in Katip.Core

Methods

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

withRunInIO :: ((forall a. KatipContextT m a -> IO a) -> IO b) -> KatipContextT m b #

MonadUnliftIO m => MonadUnliftIO (NoLoggingT m) 
Instance details

Defined in Katip.Monadic

Methods

withRunInIO :: ((forall a. NoLoggingT m a -> IO a) -> IO b) -> NoLoggingT m b #

MonadUnliftIO m => MonadUnliftIO (LoggingT m)

Since: monad-logger-0.3.26

Instance details

Defined in Control.Monad.Logger

Methods

withRunInIO :: ((forall a. LoggingT m a -> IO a) -> IO b) -> LoggingT m b #

MonadUnliftIO m => MonadUnliftIO (NoLoggingT m)

Since: monad-logger-0.3.26

Instance details

Defined in Control.Monad.Logger

Methods

withRunInIO :: ((forall a. NoLoggingT m a -> IO a) -> IO b) -> NoLoggingT m b #

MonadUnliftIO m => MonadUnliftIO (ResourceT m)

Since: resourcet-1.1.10

Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

withRunInIO :: ((forall a. ResourceT m a -> IO a) -> IO b) -> ResourceT m b #

MonadUnliftIO (HandlerFor site)

Since: yesod-core-1.4.38

Instance details

Defined in Yesod.Core.Types

Methods

withRunInIO :: ((forall a. HandlerFor site a -> IO a) -> IO b) -> HandlerFor site b #

MonadUnliftIO (WidgetFor site)

Since: yesod-core-1.4.38

Instance details

Defined in Yesod.Core.Types

Methods

withRunInIO :: ((forall a. WidgetFor site a -> IO a) -> IO b) -> WidgetFor site b #

MonadUnliftIO m => MonadUnliftIO (IdentityT m) 
Instance details

Defined in Control.Monad.IO.Unlift

Methods

withRunInIO :: ((forall a. IdentityT m a -> IO a) -> IO b) -> IdentityT m b #

MonadUnliftIO m => MonadUnliftIO (ReaderT r m) 
Instance details

Defined in Control.Monad.IO.Unlift

Methods

withRunInIO :: ((forall a. ReaderT r m a -> IO a) -> IO b) -> ReaderT r m b #

MonadUnliftIO (SubHandlerFor child master)

Since: yesod-core-1.4.38

Instance details

Defined in Yesod.Core.Types

Methods

withRunInIO :: ((forall a. SubHandlerFor child master a -> IO a) -> IO b) -> SubHandlerFor child master b #

data TChan a #

TChan is an abstract type representing an unbounded FIFO channel.

Instances

Instances details
Eq (TChan a) 
Instance details

Defined in Control.Concurrent.STM.TChan

Methods

(==) :: TChan a -> TChan a -> Bool #

(/=) :: TChan a -> TChan a -> Bool #

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

writeTChan :: TChan a -> a -> STM () #

Write a value to a TChan.

readTChan :: TChan a -> STM a #

Read the next value from the TChan.

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.

modifyTVar' :: TVar a -> (a -> a) -> STM () #

Strict version of modifyTVar.

Since: stm-2.3

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.

newtype ReaderT r (m :: Type -> Type) a #

The reader monad transformer, which adds a read-only environment to the given monad.

The return function ignores the environment, while >>= passes the inherited environment to both subcomputations.

Constructors

ReaderT 

Fields

Instances

Instances details
MonadBaseControl b m => MonadBaseControl b (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Control

Associated Types

type StM (ReaderT r m) a #

Methods

liftBaseWith :: (RunInBase (ReaderT r m) b -> b a) -> ReaderT r m a #

restoreM :: StM (ReaderT r m) a -> ReaderT r m a #

MonadError e m => MonadError e (ReaderT r m) 
Instance details

Defined in Control.Monad.Error.Class

Methods

throwError :: e -> ReaderT r m a #

catchError :: ReaderT r m a -> (e -> ReaderT r m a) -> ReaderT r m a #

Monad m => MonadReader r (ReaderT r m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: ReaderT r m r #

local :: (r -> r) -> ReaderT r m a -> ReaderT r m a #

reader :: (r -> a) -> ReaderT r m a #

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 #

MonadTransControl (ReaderT r) 
Instance details

Defined in Control.Monad.Trans.Control

Associated Types

type StT (ReaderT r) a #

Methods

liftWith :: Monad m => (Run (ReaderT r) -> m a) -> ReaderT r m a #

restoreT :: Monad m => m (StT (ReaderT r) a) -> ReaderT r m a #

MonadTrans (ReaderT r) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

lift :: Monad m => m a -> ReaderT r m a #

Representable m => Representable (ReaderT e m) 
Instance details

Defined in Data.Functor.Rep

Associated Types

type Rep (ReaderT e m) #

Methods

tabulate :: (Rep (ReaderT e m) -> a) -> ReaderT e m a #

index :: ReaderT e m a -> Rep (ReaderT e m) -> a #

MonadFail m => MonadFail (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

fail :: String -> ReaderT r m a #

MonadFix m => MonadFix (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

mfix :: (a -> ReaderT r m a) -> ReaderT r m a #

MonadIO m => MonadIO (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

liftIO :: IO a -> ReaderT r m a #

MonadZip m => MonadZip (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

mzip :: ReaderT r m a -> ReaderT r m b -> ReaderT r m (a, b) #

mzipWith :: (a -> b -> c) -> ReaderT r m a -> ReaderT r m b -> ReaderT r m c #

munzip :: ReaderT r m (a, b) -> (ReaderT r m a, ReaderT r m b) #

Contravariant m => Contravariant (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

contramap :: (a' -> a) -> ReaderT r m a -> ReaderT r m a' #

(>$) :: b -> ReaderT r m b -> ReaderT r m a #

Alternative m => Alternative (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

empty :: ReaderT r m a #

(<|>) :: ReaderT r m a -> ReaderT r m a -> ReaderT r m a #

some :: ReaderT r m a -> ReaderT r m [a] #

many :: ReaderT r m a -> ReaderT r m [a] #

Applicative m => Applicative (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

pure :: a -> ReaderT r m a #

(<*>) :: ReaderT r m (a -> b) -> ReaderT r m a -> ReaderT r m b #

liftA2 :: (a -> b -> c) -> ReaderT r m a -> ReaderT r m b -> ReaderT r m c #

(*>) :: ReaderT r m a -> ReaderT r m b -> ReaderT r m b #

(<*) :: ReaderT r m a -> ReaderT r m b -> ReaderT r m a #

Functor m => Functor (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

fmap :: (a -> b) -> ReaderT r m a -> ReaderT r m b #

(<$) :: a -> ReaderT r m b -> ReaderT r m a #

Monad m => Monad (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

(>>=) :: ReaderT r m a -> (a -> ReaderT r m b) -> ReaderT r m b #

(>>) :: ReaderT r m a -> ReaderT r m b -> ReaderT r m b #

return :: a -> ReaderT r m a #

MonadPlus m => MonadPlus (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

mzero :: ReaderT r m a #

mplus :: ReaderT r m a -> ReaderT r m a -> ReaderT r m a #

Zip m => Zip (ReaderT e m) 
Instance details

Defined in Data.ChunkedZip

Methods

zipWith :: (a -> b -> c) -> ReaderT e m a -> ReaderT e m b -> ReaderT e m c #

zip :: ReaderT e m a -> ReaderT e m b -> ReaderT e m (a, b) #

zap :: ReaderT e m (a -> b) -> ReaderT e m a -> ReaderT e m b #

unzip :: ReaderT e m (a, b) -> (ReaderT e m a, ReaderT e m b) #

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 #

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

Indexable m => Indexable (ReaderT e m) 
Instance details

Defined in Data.Key

Methods

index :: ReaderT e m a -> Key (ReaderT e m) -> a #

Keyed m => Keyed (ReaderT e m) 
Instance details

Defined in Data.Key

Methods

mapWithKey :: (Key (ReaderT e m) -> a -> b) -> ReaderT e m a -> ReaderT e m b #

Lookup m => Lookup (ReaderT e m) 
Instance details

Defined in Data.Key

Methods

lookup :: Key (ReaderT e m) -> ReaderT e m a -> Maybe a #

Zip m => Zip (ReaderT e m) 
Instance details

Defined in Data.Key

Methods

zipWith :: (a -> b -> c) -> ReaderT e m a -> ReaderT e m b -> ReaderT e m c #

zip :: ReaderT e m a -> ReaderT e m b -> ReaderT e m (a, b) #

zap :: ReaderT e m (a -> b) -> ReaderT e m a -> ReaderT e m b #

ZipWithKey m => ZipWithKey (ReaderT e m) 
Instance details

Defined in Data.Key

Methods

zipWithKey :: (Key (ReaderT e m) -> a -> b -> c) -> ReaderT e m a -> ReaderT e m b -> ReaderT e m c #

zapWithKey :: ReaderT e m (Key (ReaderT e m) -> a -> b) -> ReaderT e m a -> ReaderT e m b #

MonadLogger m => MonadLogger (ReaderT r m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> ReaderT r m () #

MonadLoggerIO m => MonadLoggerIO (ReaderT r m) 
Instance details

Defined in Control.Monad.Logger

Methods

askLoggerIO :: ReaderT r m (Loc -> LogSource -> LogLevel -> LogStr -> IO ()) #

PrimMonad m => PrimMonad (ReaderT r m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (ReaderT r m) #

Methods

primitive :: (State# (PrimState (ReaderT r m)) -> (# State# (PrimState (ReaderT r m)), a #)) -> ReaderT r m a #

MonadResource m => MonadResource (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

liftResourceT :: ResourceT IO a -> ReaderT r m a #

Apply m => Apply (ReaderT e m) 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(<.>) :: ReaderT e m (a -> b) -> ReaderT e m a -> ReaderT e m b #

(.>) :: ReaderT e m a -> ReaderT e m b -> ReaderT e m b #

(<.) :: ReaderT e m a -> ReaderT e m b -> ReaderT e m a #

liftF2 :: (a -> b -> c) -> ReaderT e m a -> ReaderT e m b -> ReaderT e m c #

Bind m => Bind (ReaderT e m) 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(>>-) :: ReaderT e m a -> (a -> ReaderT e m b) -> ReaderT e m b #

join :: ReaderT e m (ReaderT e m a) -> ReaderT e m a #

MonadUnliftIO m => MonadUnliftIO (ReaderT r m) 
Instance details

Defined in Control.Monad.IO.Unlift

Methods

withRunInIO :: ((forall a. ReaderT r m a -> IO a) -> IO b) -> ReaderT r m b #

MonadHandler m => MonadHandler (ReaderT r m) 
Instance details

Defined in Yesod.Core.Class.Handler

Associated Types

type HandlerSite (ReaderT r m) #

type SubHandlerSite (ReaderT r m) #

MonadWidget m => MonadWidget (ReaderT r m) 
Instance details

Defined in Yesod.Core.Class.Handler

Methods

liftWidget :: WidgetFor (HandlerSite (ReaderT r m)) a -> ReaderT r m a #

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 #

Functor m => MonoFunctor (ReaderT r m a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (ReaderT r m a) -> Element (ReaderT r m a)) -> ReaderT r m a -> ReaderT r m a #

Applicative m => MonoPointed (ReaderT r m a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (ReaderT r m a) -> ReaderT r m a #

type StT (ReaderT r) a 
Instance details

Defined in Control.Monad.Trans.Control

type StT (ReaderT r) a = a
type Rep1 (ReaderT r m :: Type -> Type) 
Instance details

Defined in Control.Monad.Trans.Instances

type Rep1 (ReaderT r m :: Type -> Type) = D1 ('MetaData "ReaderT" "Control.Monad.Trans.Reader" "transformers-0.5.6.2-3aDaDWB36o65bk35C5q119" 'True) (C1 ('MetaCons "ReaderT" 'PrefixI 'True) (S1 ('MetaSel ('Just "runReaderT") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) ((FUN 'Many r :: Type -> Type) :.: Rec1 m)))
type Rep (ReaderT e m) 
Instance details

Defined in Data.Functor.Rep

type Rep (ReaderT e m) = (e, Rep m)
type Key (ReaderT e m) 
Instance details

Defined in Data.Key

type Key (ReaderT e m) = (e, Key m)
type Magnified (ReaderT b m) 
Instance details

Defined in Lens.Micro.Mtl.Internal

type Magnified (ReaderT b m) = Effect m
type Zoomed (ReaderT e m) 
Instance details

Defined in Lens.Micro.Mtl.Internal

type Zoomed (ReaderT e m) = Zoomed m
type PrimState (ReaderT r m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ReaderT r m) = PrimState m
type HandlerSite (ReaderT r m) 
Instance details

Defined in Yesod.Core.Class.Handler

type SubHandlerSite (ReaderT r m) 
Instance details

Defined in Yesod.Core.Class.Handler

type StM (ReaderT r m) a 
Instance details

Defined in Control.Monad.Trans.Control

type StM (ReaderT r m) a = ComposeSt (ReaderT r) m a
type Rep (ReaderT r m a) 
Instance details

Defined in Control.Monad.Trans.Instances

type Rep (ReaderT r m a) = D1 ('MetaData "ReaderT" "Control.Monad.Trans.Reader" "transformers-0.5.6.2-3aDaDWB36o65bk35C5q119" 'True) (C1 ('MetaCons "ReaderT" 'PrefixI 'True) (S1 ('MetaSel ('Just "runReaderT") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (r -> m a))))
type Element (ReaderT r m a) 
Instance details

Defined in Data.MonoTraversable

type Element (ReaderT r m a) = 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.

($!!) :: 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

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

class NFData a where #

A class of types that can be fully evaluated.

Since: deepseq-1.1.0.0

Minimal complete definition

Nothing

Methods

rnf :: a -> () #

rnf should reduce its argument to normal form (that is, fully evaluate all sub-components), and then return ().

Generic NFData deriving

Starting with GHC 7.2, you can automatically derive instances for types possessing a Generic instance.

Note: Generic1 can be auto-derived starting with GHC 7.4

{-# LANGUAGE DeriveGeneric #-}

import GHC.Generics (Generic, Generic1)
import Control.DeepSeq

data Foo a = Foo a String
             deriving (Eq, Generic, Generic1)

instance NFData a => NFData (Foo a)
instance NFData1 Foo

data Colour = Red | Green | Blue
              deriving Generic

instance NFData Colour

Starting with GHC 7.10, the example above can be written more concisely by enabling the new DeriveAnyClass extension:

{-# LANGUAGE DeriveGeneric, DeriveAnyClass #-}

import GHC.Generics (Generic)
import Control.DeepSeq

data Foo a = Foo a String
             deriving (Eq, Generic, Generic1, NFData, NFData1)

data Colour = Red | Green | Blue
              deriving (Generic, NFData)

Compatibility with previous deepseq versions

Prior to version 1.4.0.0, the default implementation of the rnf method was defined as

rnf a = seq a ()

However, starting with deepseq-1.4.0.0, the default implementation is based on DefaultSignatures allowing for more accurate auto-derived NFData instances. If you need the previously used exact default rnf method implementation semantics, use

instance NFData Colour where rnf x = seq x ()

or alternatively

instance NFData Colour where rnf = rwhnf

or

{-# LANGUAGE BangPatterns #-}
instance NFData Colour where rnf !_ = ()

Instances

Instances details
NFData DynamicImage 
Instance details

Defined in Codec.Picture.Types

Methods

rnf :: DynamicImage -> () #

NFData JSONPathElement 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

rnf :: JSONPathElement -> () #

NFData Value 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

rnf :: Value -> () #

NFData All

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: All -> () #

NFData Any

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Any -> () #

NFData TypeRep

NOTE: Prior to deepseq-1.4.4.0 this instance was only defined for base-4.8.0.0 and later.

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: TypeRep -> () #

NFData Unique

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Unique -> () #

NFData Version

Since: deepseq-1.3.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Version -> () #

NFData Void

Defined as rnf = absurd.

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Void -> () #

NFData CBool

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CBool -> () #

NFData CChar

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CChar -> () #

NFData CClock

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CClock -> () #

NFData CDouble

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CDouble -> () #

NFData CFile

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CFile -> () #

NFData CFloat

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CFloat -> () #

NFData CFpos

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CFpos -> () #

NFData CInt

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CInt -> () #

NFData CIntMax

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CIntMax -> () #

NFData CIntPtr

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CIntPtr -> () #

NFData CJmpBuf

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CJmpBuf -> () #

NFData CLLong

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CLLong -> () #

NFData CLong

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CLong -> () #

NFData CPtrdiff

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CPtrdiff -> () #

NFData CSChar

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CSChar -> () #

NFData CSUSeconds

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CSUSeconds -> () #

NFData CShort

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CShort -> () #

NFData CSigAtomic

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CSigAtomic -> () #

NFData CSize

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CSize -> () #

NFData CTime

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CTime -> () #

NFData CUChar

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CUChar -> () #

NFData CUInt

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CUInt -> () #

NFData CUIntMax

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CUIntMax -> () #

NFData CUIntPtr

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CUIntPtr -> () #

NFData CULLong

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CULLong -> () #

NFData CULong

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CULong -> () #

NFData CUSeconds

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CUSeconds -> () #

NFData CUShort

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CUShort -> () #

NFData CWchar

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CWchar -> () #

NFData ThreadId

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: ThreadId -> () #

NFData Fingerprint

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Fingerprint -> () #

NFData MaskingState

Since: deepseq-1.4.4.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: MaskingState -> () #

NFData ExitCode

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: ExitCode -> () #

NFData Int16 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int16 -> () #

NFData Int32 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int32 -> () #

NFData Int64 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int64 -> () #

NFData Int8 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int8 -> () #

NFData CallStack

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CallStack -> () #

NFData SrcLoc

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: SrcLoc -> () #

NFData Word16 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word16 -> () #

NFData Word32 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word32 -> () #

NFData Word64 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word64 -> () #

NFData LndSig Source # 
Instance details

Defined in BtcLsp.Grpc.Sig

Methods

rnf :: LndSig -> () #

NFData MsgToSign Source # 
Instance details

Defined in BtcLsp.Grpc.Sig

Methods

rnf :: MsgToSign -> () #

NFData Ctx Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

rnf :: Ctx -> () #

NFData FeeMoney Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

rnf :: FeeMoney -> () #

NFData FeeRate Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

rnf :: FeeRate -> () #

NFData FieldIndex Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

rnf :: FieldIndex -> () #

NFData FundLnHodlInvoice Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

rnf :: FundLnHodlInvoice -> () #

NFData FundLnInvoice Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

rnf :: FundLnInvoice -> () #

NFData FundMoney Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

rnf :: FundMoney -> () #

NFData FundOnChainAddress Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

rnf :: FundOnChainAddress -> () #

NFData InputFailure Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

rnf :: InputFailure -> () #

NFData InputFailureKind Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

rnf :: InputFailureKind -> () #

NFData InternalFailure Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

rnf :: InternalFailure -> () #

NFData InternalFailure'Either Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

rnf :: InternalFailure'Either -> () #

NFData LnHost Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

rnf :: LnHost -> () #

NFData LnPeer Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

rnf :: LnPeer -> () #

NFData LnPort Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

rnf :: LnPort -> () #

NFData LnPubKey Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

rnf :: LnPubKey -> () #

NFData LocalBalance Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

rnf :: LocalBalance -> () #

NFData Nonce Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

rnf :: Nonce -> () #

NFData Privacy Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

rnf :: Privacy -> () #

NFData RefundMoney Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

rnf :: RefundMoney -> () #

NFData RefundOnChainAddress Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

rnf :: RefundOnChainAddress -> () #

NFData RemoteBalance Source # 
Instance details

Defined in Proto.BtcLsp.Data.HighLevel

Methods

rnf :: RemoteBalance -> () #

NFData LnHodlInvoice Source # 
Instance details

Defined in Proto.BtcLsp.Data.LowLevel

Methods

rnf :: LnHodlInvoice -> () #

NFData LnInvoice Source # 
Instance details

Defined in Proto.BtcLsp.Data.LowLevel

Methods

rnf :: LnInvoice -> () #

NFData Msat Source # 
Instance details

Defined in Proto.BtcLsp.Data.LowLevel

Methods

rnf :: Msat -> () #

NFData OnChainAddress Source # 
Instance details

Defined in Proto.BtcLsp.Data.LowLevel

Methods

rnf :: OnChainAddress -> () #

NFData Urational Source # 
Instance details

Defined in Proto.BtcLsp.Data.LowLevel

Methods

rnf :: Urational -> () #

NFData Request Source # 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Methods

rnf :: Request -> () #

NFData Response Source # 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Methods

rnf :: Response -> () #

NFData Response'Either Source # 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Methods

rnf :: Response'Either -> () #

NFData Response'Failure Source # 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Methods

rnf :: Response'Failure -> () #

NFData Response'Failure'InputFailure Source # 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

NFData Response'Success Source # 
Instance details

Defined in Proto.BtcLsp.Method.GetCfg

Methods

rnf :: Response'Success -> () #

NFData Request Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Methods

rnf :: Request -> () #

NFData Response Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Methods

rnf :: Response -> () #

NFData Response'Either Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Methods

rnf :: Response'Either -> () #

NFData Response'Failure Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Methods

rnf :: Response'Failure -> () #

NFData Response'Failure'InputFailure Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

NFData Response'Success Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapFromLn

Methods

rnf :: Response'Success -> () #

NFData Request Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Methods

rnf :: Request -> () #

NFData Response Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Methods

rnf :: Response -> () #

NFData Response'Either Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Methods

rnf :: Response'Either -> () #

NFData Response'Failure Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Methods

rnf :: Response'Failure -> () #

NFData Response'Failure'InputFailure Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

NFData Response'Success Source # 
Instance details

Defined in Proto.BtcLsp.Method.SwapIntoLn

Methods

rnf :: Response'Success -> () #

NFData ByteString 
Instance details

Defined in Data.ByteString.Internal

Methods

rnf :: ByteString -> () #

NFData ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Methods

rnf :: ByteString -> () #

NFData ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Methods

rnf :: ShortByteString -> () #

NFData Date 
Instance details

Defined in Chronos

Methods

rnf :: Date -> () #

NFData Datetime 
Instance details

Defined in Chronos

Methods

rnf :: Datetime -> () #

NFData DatetimeFormat 
Instance details

Defined in Chronos

Methods

rnf :: DatetimeFormat -> () #

NFData Day 
Instance details

Defined in Chronos

Methods

rnf :: Day -> () #

NFData DayOfMonth 
Instance details

Defined in Chronos

Methods

rnf :: DayOfMonth -> () #

NFData DayOfWeek 
Instance details

Defined in Chronos

Methods

rnf :: DayOfWeek -> () #

NFData DayOfYear 
Instance details

Defined in Chronos

Methods

rnf :: DayOfYear -> () #

NFData Month 
Instance details

Defined in Chronos

Methods

rnf :: Month -> () #

NFData MonthDate 
Instance details

Defined in Chronos

Methods

rnf :: MonthDate -> () #

NFData Offset 
Instance details

Defined in Chronos

Methods

rnf :: Offset -> () #

NFData OffsetDatetime 
Instance details

Defined in Chronos

Methods

rnf :: OffsetDatetime -> () #

NFData OffsetFormat 
Instance details

Defined in Chronos

Methods

rnf :: OffsetFormat -> () #

NFData OrdinalDate 
Instance details

Defined in Chronos

Methods

rnf :: OrdinalDate -> () #

NFData SubsecondPrecision 
Instance details

Defined in Chronos

Methods

rnf :: SubsecondPrecision -> () #

NFData Time 
Instance details

Defined in Chronos

Methods

rnf :: Time -> () #

NFData TimeInterval 
Instance details

Defined in Chronos

Methods

rnf :: TimeInterval -> () #

NFData TimeOfDay 
Instance details

Defined in Chronos

Methods

rnf :: TimeOfDay -> () #

NFData TimeParts 
Instance details

Defined in Chronos

Methods

rnf :: TimeParts -> () #

NFData Timespan 
Instance details

Defined in Chronos

Methods

rnf :: Timespan -> () #

NFData Year 
Instance details

Defined in Chronos

Methods

rnf :: Year -> () #

NFData IntSet 
Instance details

Defined in Data.IntSet.Internal

Methods

rnf :: IntSet -> () #

NFData SameSiteOption 
Instance details

Defined in Web.Cookie

Methods

rnf :: SameSiteOption -> () #

NFData SetCookie 
Instance details

Defined in Web.Cookie

Methods

rnf :: SetCookie -> () #

NFData SharedSecret 
Instance details

Defined in Crypto.ECC

Methods

rnf :: SharedSecret -> () #

NFData Ordering 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Ordering -> () #

NFData TyCon

NOTE: Prior to deepseq-1.4.4.0 this instance was only defined for base-4.8.0.0 and later.

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: TyCon -> () #

NFData AddHoldInvoiceRequest 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

rnf :: AddHoldInvoiceRequest -> () #

NFData AddHoldInvoiceResp 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

rnf :: AddHoldInvoiceResp -> () #

NFData CancelInvoiceMsg 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

rnf :: CancelInvoiceMsg -> () #

NFData CancelInvoiceResp 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

rnf :: CancelInvoiceResp -> () #

NFData LookupInvoiceMsg 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

rnf :: LookupInvoiceMsg -> () #

NFData LookupInvoiceMsg'InvoiceRef 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

rnf :: LookupInvoiceMsg'InvoiceRef -> () #

NFData LookupModifier 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

rnf :: LookupModifier -> () #

NFData SettleInvoiceMsg 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

rnf :: SettleInvoiceMsg -> () #

NFData SettleInvoiceResp 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

rnf :: SettleInvoiceResp -> () #

NFData SubscribeSingleInvoiceRequest 
Instance details

Defined in Proto.Invoicesrpc.Invoices

Methods

rnf :: SubscribeSingleInvoiceRequest -> () #

NFData AddressType 
Instance details

Defined in Proto.Lightning

Methods

rnf :: AddressType -> () #

NFData BatchOpenChannel 
Instance details

Defined in Proto.Lightning

Methods

rnf :: BatchOpenChannel -> () #

NFData BatchOpenChannelRequest 
Instance details

Defined in Proto.Lightning

Methods

rnf :: BatchOpenChannelRequest -> () #

NFData BatchOpenChannelResponse 
Instance details

Defined in Proto.Lightning

Methods

rnf :: BatchOpenChannelResponse -> () #

NFData Chain 
Instance details

Defined in Proto.Lightning

Methods

rnf :: Chain -> () #

NFData ChannelAcceptRequest 
Instance details

Defined in Proto.Lightning

Methods

rnf :: ChannelAcceptRequest -> () #

NFData ChannelAcceptResponse 
Instance details

Defined in Proto.Lightning

Methods

rnf :: ChannelAcceptResponse -> () #

NFData ChannelCloseUpdate 
Instance details

Defined in Proto.Lightning

Methods

rnf :: ChannelCloseUpdate -> () #

NFData ChannelOpenUpdate 
Instance details

Defined in Proto.Lightning

Methods

rnf :: ChannelOpenUpdate -> () #

NFData CloseChannelRequest 
Instance details

Defined in Proto.Lightning

Methods

rnf :: CloseChannelRequest -> () #

NFData CloseStatusUpdate 
Instance details

Defined in Proto.Lightning

Methods

rnf :: CloseStatusUpdate -> () #

NFData CloseStatusUpdate'Update 
Instance details

Defined in Proto.Lightning

Methods

rnf :: CloseStatusUpdate'Update -> () #

NFData ClosedChannelsRequest 
Instance details

Defined in Proto.Lightning

Methods

rnf :: ClosedChannelsRequest -> () #

NFData ClosedChannelsResponse 
Instance details

Defined in Proto.Lightning

Methods

rnf :: ClosedChannelsResponse -> () #

NFData ConfirmationUpdate 
Instance details

Defined in Proto.Lightning

Methods

rnf :: ConfirmationUpdate -> () #

NFData ConnectPeerRequest 
Instance details

Defined in Proto.Lightning

Methods

rnf :: ConnectPeerRequest -> () #

NFData ConnectPeerResponse 
Instance details

Defined in Proto.Lightning

Methods

rnf :: ConnectPeerResponse -> () #

NFData CustomMessage 
Instance details

Defined in Proto.Lightning

Methods

rnf :: CustomMessage -> () #

NFData DisconnectPeerRequest 
Instance details

Defined in Proto.Lightning

Methods

rnf :: DisconnectPeerRequest -> () #

NFData DisconnectPeerResponse 
Instance details

Defined in Proto.Lightning

Methods

rnf :: DisconnectPeerResponse -> () #

NFData EstimateFeeRequest 
Instance details

Defined in Proto.Lightning

Methods

rnf :: EstimateFeeRequest -> () #

NFData EstimateFeeRequest'AddrToAmountEntry 
Instance details

Defined in Proto.Lightning

Methods

rnf :: EstimateFeeRequest'AddrToAmountEntry -> () #

NFData EstimateFeeResponse 
Instance details

Defined in Proto.Lightning

Methods

rnf :: EstimateFeeResponse -> () #

NFData GetInfoRequest 
Instance details

Defined in Proto.Lightning

Methods

rnf :: GetInfoRequest -> () #

NFData GetInfoResponse 
Instance details

Defined in Proto.Lightning

Methods

rnf :: GetInfoResponse -> () #

NFData GetInfoResponse'FeaturesEntry 
Instance details

Defined in Proto.Lightning

Methods

rnf :: GetInfoResponse'FeaturesEntry -> () #

NFData GetRecoveryInfoRequest 
Instance details

Defined in Proto.Lightning

Methods

rnf :: GetRecoveryInfoRequest -> () #

NFData GetRecoveryInfoResponse 
Instance details

Defined in Proto.Lightning

Methods

rnf :: GetRecoveryInfoResponse -> () #

NFData GetTransactionsRequest 
Instance details

Defined in Proto.Lightning

Methods

rnf :: GetTransactionsRequest -> () #

NFData LightningAddress 
Instance details

Defined in Proto.Lightning

Methods

rnf :: LightningAddress -> () #

NFData ListChannelsRequest 
Instance details

Defined in Proto.Lightning

Methods

rnf :: ListChannelsRequest -> () #

NFData ListChannelsResponse 
Instance details

Defined in Proto.Lightning

Methods

rnf :: ListChannelsResponse -> () #

NFData ListPeersRequest 
Instance details

Defined in Proto.Lightning

Methods

rnf :: ListPeersRequest -> () #

NFData ListPeersResponse 
Instance details

Defined in Proto.Lightning

Methods

rnf :: ListPeersResponse -> () #

NFData ListUnspentRequest 
Instance details

Defined in Proto.Lightning

Methods

rnf :: ListUnspentRequest -> () #

NFData ListUnspentResponse 
Instance details

Defined in Proto.Lightning

Methods

rnf :: ListUnspentResponse -> () #

NFData NewAddressRequest 
Instance details

Defined in Proto.Lightning

Methods

rnf :: NewAddressRequest -> () #

NFData NewAddressResponse 
Instance details

Defined in Proto.Lightning

Methods

rnf :: NewAddressResponse -> () #

NFData OpenChannelRequest 
Instance details

Defined in Proto.Lightning

Methods

rnf :: OpenChannelRequest -> () #

NFData OpenStatusUpdate 
Instance details

Defined in Proto.Lightning

Methods

rnf :: OpenStatusUpdate -> () #

NFData OpenStatusUpdate'Update 
Instance details

Defined in Proto.Lightning

Methods

rnf :: OpenStatusUpdate'Update -> () #

NFData Peer 
Instance details

Defined in Proto.Lightning

Methods

rnf :: Peer -> () #

NFData Peer'FeaturesEntry 
Instance details

Defined in Proto.Lightning

Methods

rnf :: Peer'FeaturesEntry -> () #

NFData Peer'SyncType 
Instance details

Defined in Proto.Lightning

Methods

rnf :: Peer'SyncType -> () #

NFData PeerEvent 
Instance details

Defined in Proto.Lightning

Methods

rnf :: PeerEvent -> () #

NFData PeerEvent'EventType 
Instance details

Defined in Proto.Lightning

Methods

rnf :: PeerEvent'EventType -> () #

NFData PeerEventSubscription 
Instance details

Defined in Proto.Lightning

Methods

rnf :: PeerEventSubscription -> () #

NFData ReadyForPsbtFunding 
Instance details

Defined in Proto.Lightning

Methods

rnf :: ReadyForPsbtFunding -> () #

NFData SendCoinsRequest 
Instance details

Defined in Proto.Lightning

Methods

rnf :: SendCoinsRequest -> () #

NFData SendCoinsResponse 
Instance details

Defined in Proto.Lightning

Methods

rnf :: SendCoinsResponse -> () #

NFData SendCustomMessageRequest 
Instance details

Defined in Proto.Lightning

Methods

rnf :: SendCustomMessageRequest -> () #

NFData SendCustomMessageResponse 
Instance details

Defined in Proto.Lightning

Methods

rnf :: SendCustomMessageResponse -> () #

NFData SendManyRequest 
Instance details

Defined in Proto.Lightning

Methods

rnf :: SendManyRequest -> () #

NFData SendManyRequest'AddrToAmountEntry 
Instance details

Defined in Proto.Lightning

Methods

rnf :: SendManyRequest'AddrToAmountEntry -> () #

NFData SendManyResponse 
Instance details

Defined in Proto.Lightning

Methods

rnf :: SendManyResponse -> () #

NFData SendRequest 
Instance details

Defined in Proto.Lightning

Methods

rnf :: SendRequest -> () #

NFData SendRequest'DestCustomRecordsEntry 
Instance details

Defined in Proto.Lightning

Methods

rnf :: SendRequest'DestCustomRecordsEntry -> () #

NFData SendResponse 
Instance details

Defined in Proto.Lightning

Methods

rnf :: SendResponse -> () #

NFData SendToRouteRequest 
Instance details

Defined in Proto.Lightning

Methods

rnf :: SendToRouteRequest -> () #

NFData SignMessageRequest 
Instance details

Defined in Proto.Lightning

Methods

rnf :: SignMessageRequest -> () #

NFData SignMessageResponse 
Instance details

Defined in Proto.Lightning

Methods

rnf :: SignMessageResponse -> () #

NFData SubscribeCustomMessagesRequest 
Instance details

Defined in Proto.Lightning

Methods

rnf :: SubscribeCustomMessagesRequest -> () #

NFData TimestampedError 
Instance details

Defined in Proto.Lightning

Methods

rnf :: TimestampedError -> () #

NFData Transaction 
Instance details

Defined in Proto.Lightning

Methods

rnf :: Transaction -> () #

NFData TransactionDetails 
Instance details

Defined in Proto.Lightning

Methods

rnf :: TransactionDetails -> () #

NFData Utxo 
Instance details

Defined in Proto.Lightning

Methods

rnf :: Utxo -> () #

NFData VerifyMessageRequest 
Instance details

Defined in Proto.Lightning

Methods

rnf :: VerifyMessageRequest -> () #

NFData VerifyMessageResponse 
Instance details

Defined in Proto.Lightning

Methods

rnf :: VerifyMessageResponse -> () #

NFData AMPRecord 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: AMPRecord -> () #

NFData Amount 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: Amount -> () #

NFData ChanInfoRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: ChanInfoRequest -> () #

NFData ChanPointShim 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: ChanPointShim -> () #

NFData Channel 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: Channel -> () #

NFData ChannelBalanceRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: ChannelBalanceRequest -> () #

NFData ChannelBalanceResponse 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: ChannelBalanceResponse -> () #

NFData ChannelCloseSummary 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: ChannelCloseSummary -> () #

NFData ChannelCloseSummary'ClosureType 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: ChannelCloseSummary'ClosureType -> () #

NFData ChannelConstraints 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: ChannelConstraints -> () #

NFData ChannelEdge 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: ChannelEdge -> () #

NFData ChannelEdgeUpdate 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: ChannelEdgeUpdate -> () #

NFData ChannelEventSubscription 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: ChannelEventSubscription -> () #

NFData ChannelEventUpdate 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: ChannelEventUpdate -> () #

NFData ChannelEventUpdate'Channel 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: ChannelEventUpdate'Channel -> () #

NFData ChannelEventUpdate'UpdateType 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: ChannelEventUpdate'UpdateType -> () #

NFData ChannelGraph 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: ChannelGraph -> () #

NFData ChannelGraphRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: ChannelGraphRequest -> () #

NFData ChannelPoint 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: ChannelPoint -> () #

NFData ChannelPoint'FundingTxid 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: ChannelPoint'FundingTxid -> () #

NFData ClosedChannelUpdate 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: ClosedChannelUpdate -> () #

NFData CommitmentType 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: CommitmentType -> () #

NFData EdgeLocator 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: EdgeLocator -> () #

NFData Feature 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: Feature -> () #

NFData FeatureBit 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: FeatureBit -> () #

NFData FeeLimit 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: FeeLimit -> () #

NFData FeeLimit'Limit 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: FeeLimit'Limit -> () #

NFData FloatMetric 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: FloatMetric -> () #

NFData FundingPsbtFinalize 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: FundingPsbtFinalize -> () #

NFData FundingPsbtVerify 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: FundingPsbtVerify -> () #

NFData FundingShim 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: FundingShim -> () #

NFData FundingShim'Shim 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: FundingShim'Shim -> () #

NFData FundingShimCancel 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: FundingShimCancel -> () #

NFData FundingStateStepResp 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: FundingStateStepResp -> () #

NFData FundingTransitionMsg 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: FundingTransitionMsg -> () #

NFData FundingTransitionMsg'Trigger 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: FundingTransitionMsg'Trigger -> () #

NFData GraphTopologySubscription 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: GraphTopologySubscription -> () #

NFData GraphTopologyUpdate 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: GraphTopologyUpdate -> () #

NFData HTLC 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: HTLC -> () #

NFData Hop 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: Hop -> () #

NFData Hop'CustomRecordsEntry 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: Hop'CustomRecordsEntry -> () #

NFData HopHint 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: HopHint -> () #

NFData Initiator 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: Initiator -> () #

NFData KeyDescriptor 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: KeyDescriptor -> () #

NFData KeyLocator 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: KeyLocator -> () #

NFData LightningNode 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: LightningNode -> () #

NFData LightningNode'FeaturesEntry 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: LightningNode'FeaturesEntry -> () #

NFData MPPRecord 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: MPPRecord -> () #

NFData NetworkInfo 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: NetworkInfo -> () #

NFData NetworkInfoRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: NetworkInfoRequest -> () #

NFData NodeAddress 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: NodeAddress -> () #

NFData NodeInfo 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: NodeInfo -> () #

NFData NodeInfoRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: NodeInfoRequest -> () #

NFData NodeMetricType 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: NodeMetricType -> () #

NFData NodeMetricsRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: NodeMetricsRequest -> () #

NFData NodeMetricsResponse 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: NodeMetricsResponse -> () #

NFData NodeMetricsResponse'BetweennessCentralityEntry 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: NodeMetricsResponse'BetweennessCentralityEntry -> () #

NFData NodePair 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: NodePair -> () #

NFData NodeUpdate 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: NodeUpdate -> () #

NFData NodeUpdate'FeaturesEntry 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: NodeUpdate'FeaturesEntry -> () #

NFData OutPoint 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: OutPoint -> () #

NFData PendingChannelsRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: PendingChannelsRequest -> () #

NFData PendingChannelsResponse 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: PendingChannelsResponse -> () #

NFData PendingChannelsResponse'ClosedChannel 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: PendingChannelsResponse'ClosedChannel -> () #

NFData PendingChannelsResponse'Commitments 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: PendingChannelsResponse'Commitments -> () #

NFData PendingChannelsResponse'ForceClosedChannel 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: PendingChannelsResponse'ForceClosedChannel -> () #

NFData PendingChannelsResponse'ForceClosedChannel'AnchorState 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: PendingChannelsResponse'ForceClosedChannel'AnchorState -> () #

NFData PendingChannelsResponse'PendingChannel 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: PendingChannelsResponse'PendingChannel -> () #

NFData PendingChannelsResponse'PendingOpenChannel 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: PendingChannelsResponse'PendingOpenChannel -> () #

NFData PendingChannelsResponse'WaitingCloseChannel 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: PendingChannelsResponse'WaitingCloseChannel -> () #

NFData PendingHTLC 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: PendingHTLC -> () #

NFData PendingUpdate 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: PendingUpdate -> () #

NFData PsbtShim 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: PsbtShim -> () #

NFData QueryRoutesRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: QueryRoutesRequest -> () #

NFData QueryRoutesRequest'DestCustomRecordsEntry 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: QueryRoutesRequest'DestCustomRecordsEntry -> () #

NFData QueryRoutesResponse 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: QueryRoutesResponse -> () #

NFData Resolution 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: Resolution -> () #

NFData ResolutionOutcome 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: ResolutionOutcome -> () #

NFData ResolutionType 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: ResolutionType -> () #

NFData Route 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: Route -> () #

NFData RouteHint 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: RouteHint -> () #

NFData RoutingPolicy 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: RoutingPolicy -> () #

NFData StopRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: StopRequest -> () #

NFData StopResponse 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: StopResponse -> () #

NFData WalletAccountBalance 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: WalletAccountBalance -> () #

NFData WalletBalanceRequest 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: WalletBalanceRequest -> () #

NFData WalletBalanceResponse 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: WalletBalanceResponse -> () #

NFData WalletBalanceResponse'AccountBalanceEntry 
Instance details

Defined in Proto.Lnrpc.Ln0

Methods

rnf :: WalletBalanceResponse'AccountBalanceEntry -> () #

NFData AMP 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: AMP -> () #

NFData AMPInvoiceState 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: AMPInvoiceState -> () #

NFData AbandonChannelRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: AbandonChannelRequest -> () #

NFData AbandonChannelResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: AbandonChannelResponse -> () #

NFData AddInvoiceResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: AddInvoiceResponse -> () #

NFData BakeMacaroonRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: BakeMacaroonRequest -> () #

NFData BakeMacaroonResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: BakeMacaroonResponse -> () #

NFData ChanBackupExportRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: ChanBackupExportRequest -> () #

NFData ChanBackupSnapshot 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: ChanBackupSnapshot -> () #

NFData ChannelBackup 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: ChannelBackup -> () #

NFData ChannelBackupSubscription 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: ChannelBackupSubscription -> () #

NFData ChannelBackups 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: ChannelBackups -> () #

NFData ChannelFeeReport 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: ChannelFeeReport -> () #

NFData ChannelUpdate 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: ChannelUpdate -> () #

NFData CheckMacPermRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: CheckMacPermRequest -> () #

NFData CheckMacPermResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: CheckMacPermResponse -> () #

NFData DebugLevelRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: DebugLevelRequest -> () #

NFData DebugLevelResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: DebugLevelResponse -> () #

NFData DeleteAllPaymentsRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: DeleteAllPaymentsRequest -> () #

NFData DeleteAllPaymentsResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: DeleteAllPaymentsResponse -> () #

NFData DeleteMacaroonIDRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: DeleteMacaroonIDRequest -> () #

NFData DeleteMacaroonIDResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: DeleteMacaroonIDResponse -> () #

NFData DeletePaymentRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: DeletePaymentRequest -> () #

NFData DeletePaymentResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: DeletePaymentResponse -> () #

NFData ExportChannelBackupRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: ExportChannelBackupRequest -> () #

NFData FailedUpdate 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: FailedUpdate -> () #

NFData Failure 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: Failure -> () #

NFData Failure'FailureCode 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: Failure'FailureCode -> () #

NFData FeeReportRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: FeeReportRequest -> () #

NFData FeeReportResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: FeeReportResponse -> () #

NFData ForwardingEvent 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: ForwardingEvent -> () #

NFData ForwardingHistoryRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: ForwardingHistoryRequest -> () #

NFData ForwardingHistoryResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: ForwardingHistoryResponse -> () #

NFData HTLCAttempt 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: HTLCAttempt -> () #

NFData HTLCAttempt'HTLCStatus 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: HTLCAttempt'HTLCStatus -> () #

NFData InterceptFeedback 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: InterceptFeedback -> () #

NFData Invoice 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: Invoice -> () #

NFData Invoice'AmpInvoiceStateEntry 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: Invoice'AmpInvoiceStateEntry -> () #

NFData Invoice'FeaturesEntry 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: Invoice'FeaturesEntry -> () #

NFData Invoice'InvoiceState 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: Invoice'InvoiceState -> () #

NFData InvoiceHTLC 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: InvoiceHTLC -> () #

NFData InvoiceHTLC'CustomRecordsEntry 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: InvoiceHTLC'CustomRecordsEntry -> () #

NFData InvoiceHTLCState 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: InvoiceHTLCState -> () #

NFData InvoiceSubscription 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: InvoiceSubscription -> () #

NFData ListInvoiceRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: ListInvoiceRequest -> () #

NFData ListInvoiceResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: ListInvoiceResponse -> () #

NFData ListMacaroonIDsRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: ListMacaroonIDsRequest -> () #

NFData ListMacaroonIDsResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: ListMacaroonIDsResponse -> () #

NFData ListPaymentsRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: ListPaymentsRequest -> () #

NFData ListPaymentsResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: ListPaymentsResponse -> () #

NFData ListPermissionsRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: ListPermissionsRequest -> () #

NFData ListPermissionsResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: ListPermissionsResponse -> () #

NFData ListPermissionsResponse'MethodPermissionsEntry 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: ListPermissionsResponse'MethodPermissionsEntry -> () #

NFData MacaroonId 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: MacaroonId -> () #

NFData MacaroonPermission 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: MacaroonPermission -> () #

NFData MacaroonPermissionList 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: MacaroonPermissionList -> () #

NFData MiddlewareRegistration 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: MiddlewareRegistration -> () #

NFData MultiChanBackup 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: MultiChanBackup -> () #

NFData Op 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: Op -> () #

NFData PayReq 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: PayReq -> () #

NFData PayReq'FeaturesEntry 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: PayReq'FeaturesEntry -> () #

NFData PayReqString 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: PayReqString -> () #

NFData Payment 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: Payment -> () #

NFData Payment'PaymentStatus 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: Payment'PaymentStatus -> () #

NFData PaymentFailureReason 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: PaymentFailureReason -> () #

NFData PaymentHash 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: PaymentHash -> () #

NFData PolicyUpdateRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: PolicyUpdateRequest -> () #

NFData PolicyUpdateRequest'Scope 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: PolicyUpdateRequest'Scope -> () #

NFData PolicyUpdateResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: PolicyUpdateResponse -> () #

NFData RPCMessage 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: RPCMessage -> () #

NFData RPCMiddlewareRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: RPCMiddlewareRequest -> () #

NFData RPCMiddlewareRequest'InterceptType 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: RPCMiddlewareRequest'InterceptType -> () #

NFData RPCMiddlewareResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: RPCMiddlewareResponse -> () #

NFData RPCMiddlewareResponse'MiddlewareMessage 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: RPCMiddlewareResponse'MiddlewareMessage -> () #

NFData RestoreBackupResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: RestoreBackupResponse -> () #

NFData RestoreChanBackupRequest 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: RestoreChanBackupRequest -> () #

NFData RestoreChanBackupRequest'Backup 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: RestoreChanBackupRequest'Backup -> () #

NFData SetID 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: SetID -> () #

NFData StreamAuth 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: StreamAuth -> () #

NFData UpdateFailure 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: UpdateFailure -> () #

NFData VerifyChanBackupResponse 
Instance details

Defined in Proto.Lnrpc.Ln1

Methods

rnf :: VerifyChanBackupResponse -> () #

NFData BuildRouteRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

rnf :: BuildRouteRequest -> () #

NFData BuildRouteResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

rnf :: BuildRouteResponse -> () #

NFData ChanStatusAction 
Instance details

Defined in Proto.Routerrpc.Router

Methods

rnf :: ChanStatusAction -> () #

NFData CircuitKey 
Instance details

Defined in Proto.Routerrpc.Router

Methods

rnf :: CircuitKey -> () #

NFData FailureDetail 
Instance details

Defined in Proto.Routerrpc.Router

Methods

rnf :: FailureDetail -> () #

NFData ForwardEvent 
Instance details

Defined in Proto.Routerrpc.Router

Methods

rnf :: ForwardEvent -> () #

NFData ForwardFailEvent 
Instance details

Defined in Proto.Routerrpc.Router

Methods

rnf :: ForwardFailEvent -> () #

NFData ForwardHtlcInterceptRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

rnf :: ForwardHtlcInterceptRequest -> () #

NFData ForwardHtlcInterceptRequest'CustomRecordsEntry 
Instance details

Defined in Proto.Routerrpc.Router

Methods

rnf :: ForwardHtlcInterceptRequest'CustomRecordsEntry -> () #

NFData ForwardHtlcInterceptResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

rnf :: ForwardHtlcInterceptResponse -> () #

NFData GetMissionControlConfigRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

rnf :: GetMissionControlConfigRequest -> () #

NFData GetMissionControlConfigResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

rnf :: GetMissionControlConfigResponse -> () #

NFData HtlcEvent 
Instance details

Defined in Proto.Routerrpc.Router

Methods

rnf :: HtlcEvent -> () #

NFData HtlcEvent'Event 
Instance details

Defined in Proto.Routerrpc.Router

Methods

rnf :: HtlcEvent'Event -> () #

NFData HtlcEvent'EventType 
Instance details

Defined in Proto.Routerrpc.Router

Methods

rnf :: HtlcEvent'EventType -> () #

NFData HtlcInfo 
Instance details

Defined in Proto.Routerrpc.Router

Methods

rnf :: HtlcInfo -> () #

NFData LinkFailEvent 
Instance details

Defined in Proto.Routerrpc.Router

Methods

rnf :: LinkFailEvent -> () #

NFData MissionControlConfig 
Instance details

Defined in Proto.Routerrpc.Router

Methods

rnf :: MissionControlConfig -> () #

NFData PairData 
Instance details

Defined in Proto.Routerrpc.Router

Methods

rnf :: PairData -> () #

NFData PairHistory 
Instance details

Defined in Proto.Routerrpc.Router

Methods

rnf :: PairHistory -> () #

NFData PaymentState 
Instance details

Defined in Proto.Routerrpc.Router

Methods

rnf :: PaymentState -> () #

NFData PaymentStatus 
Instance details

Defined in Proto.Routerrpc.Router

Methods

rnf :: PaymentStatus -> () #

NFData QueryMissionControlRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

rnf :: QueryMissionControlRequest -> () #

NFData QueryMissionControlResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

rnf :: QueryMissionControlResponse -> () #

NFData QueryProbabilityRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

rnf :: QueryProbabilityRequest -> () #

NFData QueryProbabilityResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

rnf :: QueryProbabilityResponse -> () #

NFData ResetMissionControlRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

rnf :: ResetMissionControlRequest -> () #

NFData ResetMissionControlResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

rnf :: ResetMissionControlResponse -> () #

NFData ResolveHoldForwardAction 
Instance details

Defined in Proto.Routerrpc.Router

Methods

rnf :: ResolveHoldForwardAction -> () #

NFData RouteFeeRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

rnf :: RouteFeeRequest -> () #

NFData RouteFeeResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

rnf :: RouteFeeResponse -> () #

NFData SendPaymentRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

rnf :: SendPaymentRequest -> () #

NFData SendPaymentRequest'DestCustomRecordsEntry 
Instance details

Defined in Proto.Routerrpc.Router

Methods

rnf :: SendPaymentRequest'DestCustomRecordsEntry -> () #

NFData SendToRouteRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

rnf :: SendToRouteRequest -> () #

NFData SendToRouteResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

rnf :: SendToRouteResponse -> () #

NFData SetMissionControlConfigRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

rnf :: SetMissionControlConfigRequest -> () #

NFData SetMissionControlConfigResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

rnf :: SetMissionControlConfigResponse -> () #

NFData SettleEvent 
Instance details

Defined in Proto.Routerrpc.Router

Methods

rnf :: SettleEvent -> () #

NFData SubscribeHtlcEventsRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

rnf :: SubscribeHtlcEventsRequest -> () #

NFData TrackPaymentRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

rnf :: TrackPaymentRequest -> () #

NFData UpdateChanStatusRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

rnf :: UpdateChanStatusRequest -> () #

NFData UpdateChanStatusResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

rnf :: UpdateChanStatusResponse -> () #

NFData XImportMissionControlRequest 
Instance details

Defined in Proto.Routerrpc.Router

Methods

rnf :: XImportMissionControlRequest -> () #

NFData XImportMissionControlResponse 
Instance details

Defined in Proto.Routerrpc.Router

Methods

rnf :: XImportMissionControlResponse -> () #

NFData InputScript 
Instance details

Defined in Proto.Signrpc.Signer

Methods

rnf :: InputScript -> () #

NFData InputScriptResp 
Instance details

Defined in Proto.Signrpc.Signer

Methods

rnf :: InputScriptResp -> () #

NFData KeyDescriptor 
Instance details

Defined in Proto.Signrpc.Signer

Methods

rnf :: KeyDescriptor -> () #

NFData KeyLocator 
Instance details

Defined in Proto.Signrpc.Signer

Methods

rnf :: KeyLocator -> () #

NFData SharedKeyRequest 
Instance details

Defined in Proto.Signrpc.Signer

Methods

rnf :: SharedKeyRequest -> () #

NFData SharedKeyResponse 
Instance details

Defined in Proto.Signrpc.Signer

Methods

rnf :: SharedKeyResponse -> () #

NFData SignDescriptor 
Instance details

Defined in Proto.Signrpc.Signer

Methods

rnf :: SignDescriptor -> () #

NFData SignMessageReq 
Instance details

Defined in Proto.Signrpc.Signer

Methods

rnf :: SignMessageReq -> () #

NFData SignMessageResp 
Instance details

Defined in Proto.Signrpc.Signer

Methods

rnf :: SignMessageResp -> () #

NFData SignReq 
Instance details

Defined in Proto.Signrpc.Signer

Methods

rnf :: SignReq -> () #

NFData SignResp 
Instance details

Defined in Proto.Signrpc.Signer

Methods

rnf :: SignResp -> () #

NFData TxOut 
Instance details

Defined in Proto.Signrpc.Signer

Methods

rnf :: TxOut -> () #

NFData VerifyMessageReq 
Instance details

Defined in Proto.Signrpc.Signer

Methods

rnf :: VerifyMessageReq -> () #

NFData VerifyMessageResp 
Instance details

Defined in Proto.Signrpc.Signer

Methods

rnf :: VerifyMessageResp -> () #

NFData Account 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: Account -> () #

NFData AddrRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: AddrRequest -> () #

NFData AddrResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: AddrResponse -> () #

NFData AddressType 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: AddressType -> () #

NFData BumpFeeRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: BumpFeeRequest -> () #

NFData BumpFeeResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: BumpFeeResponse -> () #

NFData EstimateFeeRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: EstimateFeeRequest -> () #

NFData EstimateFeeResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: EstimateFeeResponse -> () #

NFData FinalizePsbtRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: FinalizePsbtRequest -> () #

NFData FinalizePsbtResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: FinalizePsbtResponse -> () #

NFData FundPsbtRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: FundPsbtRequest -> () #

NFData FundPsbtRequest'Fees 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: FundPsbtRequest'Fees -> () #

NFData FundPsbtRequest'Template 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: FundPsbtRequest'Template -> () #

NFData FundPsbtResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: FundPsbtResponse -> () #

NFData ImportAccountRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: ImportAccountRequest -> () #

NFData ImportAccountResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: ImportAccountResponse -> () #

NFData ImportPublicKeyRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: ImportPublicKeyRequest -> () #

NFData ImportPublicKeyResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: ImportPublicKeyResponse -> () #

NFData KeyReq 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: KeyReq -> () #

NFData LabelTransactionRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: LabelTransactionRequest -> () #

NFData LabelTransactionResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: LabelTransactionResponse -> () #

NFData LeaseOutputRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: LeaseOutputRequest -> () #

NFData LeaseOutputResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: LeaseOutputResponse -> () #

NFData ListAccountsRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: ListAccountsRequest -> () #

NFData ListAccountsResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: ListAccountsResponse -> () #

NFData ListLeasesRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: ListLeasesRequest -> () #

NFData ListLeasesResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: ListLeasesResponse -> () #

NFData ListSweepsRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: ListSweepsRequest -> () #

NFData ListSweepsResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: ListSweepsResponse -> () #

NFData ListSweepsResponse'Sweeps 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: ListSweepsResponse'Sweeps -> () #

NFData ListSweepsResponse'TransactionIDs 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: ListSweepsResponse'TransactionIDs -> () #

NFData ListUnspentRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: ListUnspentRequest -> () #

NFData ListUnspentResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: ListUnspentResponse -> () #

NFData PendingSweep 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: PendingSweep -> () #

NFData PendingSweepsRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: PendingSweepsRequest -> () #

NFData PendingSweepsResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: PendingSweepsResponse -> () #

NFData PublishResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: PublishResponse -> () #

NFData ReleaseOutputRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: ReleaseOutputRequest -> () #

NFData ReleaseOutputResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: ReleaseOutputResponse -> () #

NFData SendOutputsRequest 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: SendOutputsRequest -> () #

NFData SendOutputsResponse 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: SendOutputsResponse -> () #

NFData Transaction 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: Transaction -> () #

NFData TxTemplate 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: TxTemplate -> () #

NFData TxTemplate'OutputsEntry 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: TxTemplate'OutputsEntry -> () #

NFData UtxoLease 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: UtxoLease -> () #

NFData WitnessType 
Instance details

Defined in Proto.Walletrpc.Walletkit

Methods

rnf :: WitnessType -> () #

NFData ChangePasswordRequest 
Instance details

Defined in Proto.Walletunlocker

Methods

rnf :: ChangePasswordRequest -> () #

NFData ChangePasswordResponse 
Instance details

Defined in Proto.Walletunlocker

Methods

rnf :: ChangePasswordResponse -> () #

NFData GenSeedRequest 
Instance details

Defined in Proto.Walletunlocker

Methods

rnf :: GenSeedRequest -> () #

NFData GenSeedResponse 
Instance details

Defined in Proto.Walletunlocker

Methods

rnf :: GenSeedResponse -> () #

NFData InitWalletRequest 
Instance details

Defined in Proto.Walletunlocker

Methods

rnf :: InitWalletRequest -> () #

NFData InitWalletResponse 
Instance details

Defined in Proto.Walletunlocker

Methods

rnf :: InitWalletResponse -> () #

NFData UnlockWalletRequest 
Instance details

Defined in Proto.Walletunlocker

Methods

rnf :: UnlockWalletRequest -> () #

NFData UnlockWalletResponse 
Instance details

Defined in Proto.Walletunlocker

Methods

rnf :: UnlockWalletResponse -> () #

NFData WatchOnly 
Instance details

Defined in Proto.Walletunlocker

Methods

rnf :: WatchOnly -> () #

NFData WatchOnlyAccount 
Instance details

Defined in Proto.Walletunlocker

Methods

rnf :: WatchOnlyAccount -> () #

NFData SockAddr 
Instance details

Defined in Network.Socket.Types

Methods

rnf :: SockAddr -> () #

NFData URI 
Instance details

Defined in Network.URI

Methods

rnf :: URI -> () #

NFData URIAuth 
Instance details

Defined in Network.URI

Methods

rnf :: URIAuth -> () #

NFData TextDetails 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

rnf :: TextDetails -> () #

NFData Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Methods

rnf :: Doc -> () #

NFData ByteArray 
Instance details

Defined in Data.Primitive.ByteArray

Methods

rnf :: ByteArray -> () #

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 WireValue 
Instance details

Defined in Data.ProtoLens.Encoding.Wire

Methods

rnf :: WireValue -> () #

NFData StdGen 
Instance details

Defined in System.Random.Internal

Methods

rnf :: StdGen -> () #

NFData Scientific 
Instance details

Defined in Data.Scientific

Methods

rnf :: Scientific -> () #

NFData CompactSig 
Instance details

Defined in Crypto.Secp256k1

Methods

rnf :: CompactSig -> () #

NFData Msg 
Instance details

Defined in Crypto.Secp256k1

Methods

rnf :: Msg -> () #

NFData PubKey 
Instance details

Defined in Crypto.Secp256k1

Methods

rnf :: PubKey -> () #

NFData SecKey 
Instance details

Defined in Crypto.Secp256k1

Methods

rnf :: SecKey -> () #

NFData Sig 
Instance details

Defined in Crypto.Secp256k1

Methods

rnf :: Sig -> () #

NFData Tweak 
Instance details

Defined in Crypto.Secp256k1

Methods

rnf :: Tweak -> () #

NFData UnicodeException 
Instance details

Defined in Data.Text.Encoding.Error

Methods

rnf :: UnicodeException -> () #

NFData ShortText 
Instance details

Defined in Data.Text.Short.Internal

Methods

rnf :: ShortText -> () #

NFData Day 
Instance details

Defined in Data.Time.Calendar.Days

Methods

rnf :: Day -> () #

NFData DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Methods

rnf :: DiffTime -> () #

NFData NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Methods

rnf :: NominalDiffTime -> () #

NFData UTCTime 
Instance details

Defined in Data.Time.Clock.Internal.UTCTime

Methods

rnf :: UTCTime -> () #

NFData LocalTime 
Instance details

Defined in Data.Time.LocalTime.Internal.LocalTime

Methods

rnf :: LocalTime -> () #

NFData TimeOfDay 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeOfDay

Methods

rnf :: TimeOfDay -> () #

NFData ZonedTime 
Instance details

Defined in Data.Time.LocalTime.Internal.ZonedTime

Methods

rnf :: ZonedTime -> () #

NFData UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

rnf :: UUID -> () #

NFData Int128 
Instance details

Defined in Data.WideWord.Int128

Methods

rnf :: Int128 -> () #

NFData Word128 
Instance details

Defined in Data.WideWord.Word128

Methods

rnf :: Word128 -> () #

NFData Word256 
Instance details

Defined in Data.WideWord.Word256

Methods

rnf :: Word256 -> () #

NFData Content 
Instance details

Defined in Data.XML.Types

Methods

rnf :: Content -> () #

NFData Doctype 
Instance details

Defined in Data.XML.Types

Methods

rnf :: Doctype -> () #

NFData Document 
Instance details

Defined in Data.XML.Types

Methods

rnf :: Document -> () #

NFData Element 
Instance details

Defined in Data.XML.Types

Methods

rnf :: Element -> () #

NFData Event 
Instance details

Defined in Data.XML.Types

Methods

rnf :: Event -> () #

NFData ExternalID 
Instance details

Defined in Data.XML.Types

Methods

rnf :: ExternalID -> () #

NFData Instruction 
Instance details

Defined in Data.XML.Types

Methods

rnf :: Instruction -> () #

NFData Miscellaneous 
Instance details

Defined in Data.XML.Types

Methods

rnf :: Miscellaneous -> () #

NFData Name 
Instance details

Defined in Data.XML.Types

Methods

rnf :: Name -> () #

NFData Node 
Instance details

Defined in Data.XML.Types

Methods

rnf :: Node -> () #

NFData Prologue 
Instance details

Defined in Data.XML.Types

Methods

rnf :: Prologue -> () #

NFData ErrorResponse 
Instance details

Defined in Yesod.Core.Types

Methods

rnf :: ErrorResponse -> () #

NFData Header 
Instance details

Defined in Yesod.Core.Types

Methods

rnf :: Header -> () #

NFData Word8 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word8 -> () #

NFData Integer 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Integer -> () #

NFData Natural

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Natural -> () #

NFData () 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: () -> () #

NFData Bool 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Bool -> () #

NFData Char 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Char -> () #

NFData Double 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Double -> () #

NFData Float 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Float -> () #

NFData Int 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int -> () #

NFData Word 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word -> () #

NFData (Image a) 
Instance details

Defined in Codec.Picture.Types

Methods

rnf :: Image a -> () #

NFData a => NFData (Only a) 
Instance details

Defined in Data.Tuple.Only

Methods

rnf :: Only a -> () #

NFData a => NFData (IResult a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

rnf :: IResult a -> () #

NFData a => NFData (Result a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

rnf :: Result a -> () #

NFData a => NFData (ZipList a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: ZipList a -> () #

NFData a => NFData (Complex a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Complex a -> () #

NFData a => NFData (Identity a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Identity a -> () #

NFData a => NFData (First a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: First a -> () #

NFData a => NFData (Last a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Last a -> () #

NFData a => NFData (Down a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Down a -> () #

NFData a => NFData (First a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: First a -> () #

NFData a => NFData (Last a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Last a -> () #

NFData a => NFData (Max a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Max a -> () #

NFData a => NFData (Min a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Min a -> () #

NFData a => NFData (Option a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Option a -> () #

NFData m => NFData (WrappedMonoid m)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: WrappedMonoid m -> () #

NFData a => NFData (Dual a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Dual a -> () #

NFData a => NFData (Product a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Product a -> () #

NFData a => NFData (Sum a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Sum a -> () #

NFData a => NFData (NonEmpty a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: NonEmpty a -> () #

NFData (IORef a)

NOTE: Only strict in the reference and not the referenced value.

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: IORef a -> () #

NFData (MVar a)

NOTE: Only strict in the reference and not the referenced value.

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: MVar a -> () #

NFData (FunPtr a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: FunPtr a -> () #

NFData (Ptr a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Ptr a -> () #

NFData a => NFData (Ratio a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Ratio a -> () #

NFData (StableName a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: StableName a -> () #

NFData s => NFData (CI s) 
Instance details

Defined in Data.CaseInsensitive.Internal

Methods

rnf :: CI s -> () #

NFData a => NFData (DatetimeLocale a) 
Instance details

Defined in Chronos

Methods

rnf :: DatetimeLocale a -> () #

NFData a => NFData (DayOfWeekMatch a) 
Instance details

Defined in Chronos

Methods

rnf :: DayOfWeekMatch a -> () #

NFData a => NFData (MeridiemLocale a) 
Instance details

Defined in Chronos

Methods

rnf :: MeridiemLocale a -> () #

NFData a => NFData (MonthMatch a) 
Instance details

Defined in Chronos

Methods

rnf :: MonthMatch a -> () #

NFData (UnboxedMonthMatch a) 
Instance details

Defined in Chronos

Methods

rnf :: UnboxedMonthMatch a -> () #

NFData a => NFData (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

rnf :: IntMap a -> () #

NFData a => NFData (Digit a) 
Instance details

Defined in Data.Sequence.Internal

Methods

rnf :: Digit a -> () #

NFData a => NFData (Elem a) 
Instance details

Defined in Data.Sequence.Internal

Methods

rnf :: Elem a -> () #

NFData a => NFData (FingerTree a) 
Instance details

Defined in Data.Sequence.Internal

Methods

rnf :: FingerTree a -> () #

NFData a => NFData (Node a) 
Instance details

Defined in Data.Sequence.Internal

Methods

rnf :: Node a -> () #

NFData a => NFData (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

rnf :: Seq a -> () #

NFData a => NFData (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

rnf :: Set a -> () #

NFData a => NFData (Tree a) 
Instance details

Defined in Data.Tree

Methods

rnf :: Tree a -> () #

NFData (Context a) 
Instance details

Defined in Crypto.Hash.Types

Methods

rnf :: Context a -> () #

NFData (Digest a) 
Instance details

Defined in Crypto.Hash.Types

Methods

rnf :: Digest a -> () #

NFData1 f => NFData (Fix f) 
Instance details

Defined in Data.Fix

Methods

rnf :: Fix f -> () #

NFData a => NFData (DNonEmpty a) 
Instance details

Defined in Data.DList.DNonEmpty.Internal

Methods

rnf :: DNonEmpty a -> () #

NFData a => NFData (DList a) 
Instance details

Defined in Data.DList.Internal

Methods

rnf :: DList a -> () #

NFData a => NFData (Hashed a) 
Instance details

Defined in Data.Hashable.Class

Methods

rnf :: Hashed a -> () #

NFData a => NFData (AnnotDetails a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

rnf :: AnnotDetails a -> () #

NFData a => NFData (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

rnf :: Doc a -> () #

NFData a => NFData (Array a) 
Instance details

Defined in Data.Primitive.Array

Methods

rnf :: Array a -> () #

NFData (MutableByteArray s) 
Instance details

Defined in Data.Primitive.ByteArray

Methods

rnf :: MutableByteArray s -> () #

NFData (PrimArray a) 
Instance details

Defined in Data.Primitive.PrimArray

Methods

rnf :: PrimArray a -> () #

NFData a => NFData (SmallArray a) 
Instance details

Defined in Data.Primitive.SmallArray

Methods

rnf :: SmallArray a -> () #

NFData g => NFData (StateGen g) 
Instance details

Defined in System.Random.Internal

Methods

rnf :: StateGen g -> () #

NFData g => NFData (AtomicGen g) 
Instance details

Defined in System.Random.Stateful

Methods

rnf :: AtomicGen g -> () #

NFData g => NFData (IOGen g) 
Instance details

Defined in System.Random.Stateful

Methods

rnf :: IOGen g -> () #

NFData g => NFData (STGen g) 
Instance details

Defined in System.Random.Stateful

Methods

rnf :: STGen g -> () #

NFData g => NFData (TGen g) 
Instance details

Defined in System.Random.Stateful

Methods

rnf :: TGen g -> () #

NFData a => NFData (Maybe a) 
Instance details

Defined in Data.Strict.Maybe

Methods

rnf :: Maybe a -> () #

NFData a => NFData (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Methods

rnf :: HashSet a -> () #

NFData a => NFData (Vector a) 
Instance details

Defined in Data.Vector

Methods

rnf :: Vector a -> () #

NFData (Vector a) 
Instance details

Defined in Data.Vector.Primitive

Methods

rnf :: Vector a -> () #

NFData (Vector a) 
Instance details

Defined in Data.Vector.Storable

Methods

rnf :: Vector a -> () #

NFData (Vector a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

rnf :: Vector a -> () #

NFData a => NFData (Maybe a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Maybe a -> () #

NFData a => NFData [a] 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: [a] -> () #

NFData (MutableImage s a) 
Instance details

Defined in Codec.Picture.Types

Methods

rnf :: MutableImage s a -> () #

(NFData i, NFData r) => NFData (IResult i r) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

rnf :: IResult i r -> () #

(NFData a, NFData b) => NFData (Either a b) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Either a b -> () #

NFData (Fixed a)

Since: deepseq-1.3.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Fixed a -> () #

NFData (Proxy a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Proxy a -> () #

(NFData a, NFData b) => NFData (Arg a b)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Arg a b -> () #

(NFData a, NFData b) => NFData (Array a b) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Array a b -> () #

NFData (STRef s a)

NOTE: Only strict in the reference and not the referenced value.

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: STRef s a -> () #

(NFData k, NFData a) => NFData (Map k a) 
Instance details

Defined in Data.Map.Internal

Methods

rnf :: Map k a -> () #

(NFData a, NFData b) => NFData (Gr a b) 
Instance details

Defined in Data.Graph.Inductive.PatriciaTree

Methods

rnf :: Gr a b -> () #

NFData (MutablePrimArray s a) 
Instance details

Defined in Data.Primitive.PrimArray

Methods

rnf :: MutablePrimArray s a -> () #

(NFData a, NFData b) => NFData (Either a b) 
Instance details

Defined in Data.Strict.Either

Methods

rnf :: Either a b -> () #

(NFData a, NFData b) => NFData (These a b) 
Instance details

Defined in Data.Strict.These

Methods

rnf :: These a b -> () #

(NFData a, NFData b) => NFData (Pair a b) 
Instance details

Defined in Data.Strict.Tuple

Methods

rnf :: Pair a b -> () #

(NFData a, NFData b) => NFData (These a b)

Since: these-0.7.1

Instance details

Defined in Data.These

Methods

rnf :: These a b -> () #

(NFData k, NFData v) => NFData (HashMap k v) 
Instance details

Defined in Data.HashMap.Internal

Methods

rnf :: HashMap k v -> () #

(NFData k, NFData v) => NFData (Leaf k v) 
Instance details

Defined in Data.HashMap.Internal

Methods

rnf :: Leaf k v -> () #

NFData (MVector s a) 
Instance details

Defined in Data.Vector.Primitive.Mutable

Methods

rnf :: MVector s a -> () #

NFData (MVector s a) 
Instance details

Defined in Data.Vector.Storable.Mutable

Methods

rnf :: MVector s a -> () #

NFData (MVector s a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

rnf :: MVector s a -> () #

NFData (a -> b)

This instance is for convenience and consistency with seq. This assumes that WHNF is equivalent to NF for functions.

Since: deepseq-1.3.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a -> b) -> () #

(NFData a, NFData b) => NFData (a, b) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a, b) -> () #

NFData a => NFData (Const a b)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Const a b -> () #

NFData (a :~: b)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a :~: b) -> () #

NFData b => NFData (Tagged s b) 
Instance details

Defined in Data.Tagged

Methods

rnf :: Tagged s b -> () #

(NFData1 f, NFData1 g, NFData a) => NFData (These1 f g a)

This instance is available only with deepseq >= 1.4.3.0

Instance details

Defined in Data.Functor.These

Methods

rnf :: These1 f g a -> () #

(NFData a1, NFData a2, NFData a3) => NFData (a1, a2, a3) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a1, a2, a3) -> () #

(NFData1 f, NFData1 g, NFData a) => NFData (Product f g a)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Product f g a -> () #

(NFData1 f, NFData1 g, NFData a) => NFData (Sum f g a)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Sum f g a -> () #

NFData (a :~~: b)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a :~~: b) -> () #

(NFData a1, NFData a2, NFData a3, NFData a4) => NFData (a1, a2, a3, a4) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a1, a2, a3, a4) -> () #

(NFData1 f, NFData1 g, NFData a) => NFData (Compose f g a)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Compose f g a -> () #

(NFData a1, NFData a2, NFData a3, NFData a4, NFData a5) => NFData (a1, a2, a3, a4, a5) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a1, a2, a3, a4, a5) -> () #

(NFData a1, NFData a2, NFData a3, NFData a4, NFData a5, NFData a6) => NFData (a1, a2, a3, a4, a5, a6) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a1, a2, a3, a4, a5, a6) -> () #

(NFData a1, NFData a2, NFData a3, NFData a4, NFData a5, NFData a6, NFData a7) => NFData (a1, a2, a3, a4, a5, a6, a7) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a1, a2, a3, a4, a5, a6, a7) -> () #

(NFData a1, NFData a2, NFData a3, NFData a4, NFData a5, NFData a6, NFData a7, NFData a8) => NFData (a1, a2, a3, a4, a5, a6, a7, a8) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a1, a2, a3, a4, a5, a6, a7, a8) -> () #

(NFData a1, NFData a2, NFData a3, NFData a4, NFData a5, NFData a6, NFData a7, NFData a8, NFData a9) => NFData (a1, a2, a3, a4, a5, a6, a7, a8, a9) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a1, a2, a3, a4, a5, a6, a7, a8, a9) -> () #

class Monad m => MonadThrow (m :: Type -> Type) #

A class for monads in which exceptions may be thrown.

Instances should obey the following law:

throwM e >> x = throwM e

In other words, throwing an exception short-circuits the rest of the monadic computation.

Minimal complete definition

throwM

Instances

Instances details
MonadThrow STM 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> STM a #

MonadThrow IO 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> IO a #

MonadThrow Q 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> Q a #

MonadThrow Maybe 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> Maybe a #

MonadThrow [] 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> [a] #

e ~ SomeException => MonadThrow (Either e) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e0 => e0 -> Either e a #

MonadThrow (ST s) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> ST s a #

Monad m => MonadThrow (CatchT m) 
Instance details

Defined in Control.Monad.Catch.Pure

Methods

throwM :: Exception e => e -> CatchT 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 (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 (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

throwM :: Exception e => e -> ResourceT m a #

MonadThrow m => MonadThrow (ListT m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> ListT m a #

MonadThrow m => MonadThrow (MaybeT m)

Throws exceptions into the base monad.

Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> MaybeT m a #

MonadThrow (HandlerFor site) 
Instance details

Defined in Yesod.Core.Types

Methods

throwM :: Exception e => e -> HandlerFor site a #

MonadThrow (WidgetFor site) 
Instance details

Defined in Yesod.Core.Types

Methods

throwM :: Exception e => e -> WidgetFor site a #

(Functor f, MonadThrow m) => MonadThrow (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

throwM :: Exception e => e -> FreeT f m a #

(Error e, MonadThrow m) => MonadThrow (ErrorT e m)

Throws exceptions into the base monad.

Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e0 => e0 -> ErrorT e m a #

MonadThrow m => MonadThrow (ExceptT e m)

Throws exceptions into the base monad.

Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e0 => e0 -> ExceptT e m a #

MonadThrow m => MonadThrow (IdentityT m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> IdentityT m a #

MonadThrow m => MonadThrow (ReaderT r m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> ReaderT r m a #

MonadThrow m => MonadThrow (StateT s m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> StateT s m a #

MonadThrow m => MonadThrow (StateT s m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> StateT s m a #

(MonadThrow m, Monoid w) => MonadThrow (WriterT w m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> WriterT w m a #

(MonadThrow m, Monoid w) => MonadThrow (WriterT w m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> WriterT w m a #

MonadThrow (SubHandlerFor child master) 
Instance details

Defined in Yesod.Core.Types

Methods

throwM :: Exception e => e -> SubHandlerFor child master a #

MonadThrow m => MonadThrow (ConduitT i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

throwM :: Exception e => e -> ConduitT i o m a #

MonadThrow m => MonadThrow (ContT r m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> ContT r m a #

(MonadThrow m, Monoid w) => MonadThrow (RWST r w s m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> RWST r w s m a #

(MonadThrow m, Monoid w) => MonadThrow (RWST r w s m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> RWST r w s m a #

MonadThrow m => MonadThrow (Pipe l i o u m) 
Instance details

Defined in Data.Conduit.Internal.Pipe

Methods

throwM :: Exception e => e -> Pipe l i o u m a #

class MonadTrans (t :: (Type -> Type) -> Type -> Type) where #

The class of monad transformers. Instances should satisfy the following laws, which state that lift is a monad transformation:

Methods

lift :: Monad m => m a -> t m a #

Lift a computation from the argument monad to the constructed monad.

Instances

Instances details
MonadTrans CatchT 
Instance details

Defined in Control.Monad.Catch.Pure

Methods

lift :: Monad m => m a -> CatchT m a #

MonadTrans Free

This is not a true monad transformer. It is only a monad transformer "up to retract".

Instance details

Defined in Control.Monad.Free

Methods

lift :: Monad m => m a -> Free m a #

MonadTrans 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 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 ResourceT 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

lift :: Monad m => m a -> ResourceT m a #

MonadTrans ListT 
Instance details

Defined in Control.Monad.Trans.List

Methods

lift :: Monad m => m a -> ListT m a #

MonadTrans MaybeT 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

lift :: Monad m => m a -> MaybeT m a #

MonadTrans AForm 
Instance details

Defined in Yesod.Form.Types

Methods

lift :: Monad m => m a -> AForm m a #

MonadTrans (ExceptRT r) 
Instance details

Defined in Data.EitherR

Methods

lift :: Monad m => m a -> ExceptRT r m a #

MonadTrans (FreeT f) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

lift :: Monad m => m a -> FreeT f m a #

Monoid w => MonadTrans (AccumT w) 
Instance details

Defined in Control.Monad.Trans.Accum

Methods

lift :: Monad m => m a -> AccumT w m a #

MonadTrans (ErrorT e) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

lift :: Monad m => m a -> ErrorT e m a #

MonadTrans (ExceptT e) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

lift :: Monad m => m a -> ExceptT e m a #

MonadTrans (IdentityT :: (Type -> Type) -> Type -> Type) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

lift :: Monad m => m a -> IdentityT m a #

MonadTrans (ReaderT r) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

lift :: Monad m => m a -> ReaderT r m a #

MonadTrans (SelectT r) 
Instance details

Defined in Control.Monad.Trans.Select

Methods

lift :: Monad m => m a -> SelectT r m a #

MonadTrans (StateT s) 
Instance details

Defined in Control.Monad.Trans.State.Lazy

Methods

lift :: Monad m => m a -> StateT s m a #

MonadTrans (StateT s) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

lift :: Monad m => m a -> StateT s m a #

MonadTrans (WriterT w) 
Instance details

Defined in Control.Monad.Trans.Writer.CPS

Methods

lift :: Monad m => m a -> WriterT w m a #

Monoid w => MonadTrans (WriterT w) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

lift :: Monad m => m a -> WriterT w m a #

Monoid w => MonadTrans (WriterT w) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

lift :: Monad m => m a -> WriterT w m a #

MonadTrans (ConduitT i o) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

lift :: Monad m => m a -> ConduitT i o m a #

MonadTrans (ContT r) 
Instance details

Defined in Control.Monad.Trans.Cont

Methods

lift :: Monad m => m a -> ContT r m a #

MonadTrans (RWST r w s) 
Instance details

Defined in Control.Monad.Trans.RWS.CPS

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.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 #

class ToMessage a where #

ToMessage is used to convert the value inside #{ } to Text

The primary purpose of this class is to allow the value in #{ } to be a String or Text rather than forcing it to always be Text.

Methods

toMessage :: a -> Text #

Instances

Instances details
ToMessage FeeRate Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

toMessage :: FeeRate -> Text #

ToMessage MSat Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Methods

toMessage :: MSat -> Text #

ToMessage Text 
Instance details

Defined in Text.Shakespeare.I18N

Methods

toMessage :: Text -> Text #

ToMessage String 
Instance details

Defined in Text.Shakespeare.I18N

Methods

toMessage :: String -> Text #

ToMessage (Uuid tab) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

toMessage :: Uuid tab -> Text #

ToMessage (Money owner btcl mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

toMessage :: Money owner btcl mrel -> Text #

data Entity record #

Datatype that represents an entity, with both its Key and its Haskell record representation.

When using a SQL-based backend (such as SQLite or PostgreSQL), an Entity may take any number of columns depending on how many fields it has. In order to reconstruct your entity on the Haskell side, persistent needs all of your entity columns and in the right order. Note that you don't need to worry about this when using persistent's API since everything is handled correctly behind the scenes.

However, if you want to issue a raw SQL command that returns an Entity, then you have to be careful with the column order. While you could use SELECT Entity.* WHERE ... and that would work most of the time, there are times when the order of the columns on your database is different from the order that persistent expects (for example, if you add a new field in the middle of you entity definition and then use the migration code -- persistent will expect the column to be in the middle, but your DBMS will put it as the last column). So, instead of using a query like the one above, you may use rawSql (from the Database.Persist.GenericSql module) with its /entity selection placeholder/ (a double question mark ??). Using rawSql the query above must be written as SELECT ?? WHERE ... Then rawSql will replace ?? with the list of all columns that we need from your entity in the right order. If your query returns two entities (i.e. (Entity backend a, Entity backend b)), then you must you use SELECT ??, ?? WHERE ..., and so on.

Constructors

Entity 

Fields

Instances

Instances details
(PersistEntity rec, PersistField typ, SymbolToField sym rec typ) => HasField (sym :: Symbol) (SqlExpr (Entity rec)) (SqlExpr (Value typ))

This instance allows you to use record.field notation with GHC 9.2's OverloadedRecordDot extension.

Example:

-- persistent model:
BlogPost
    authorId     PersonId
    title        Text

-- query:
select $ do
    bp <- from $ table @BlogPost
    pure $ bp.title

This is exactly equivalent to the following:

blogPost :: SqlExpr (Entity BlogPost)

blogPost ^. BlogPostTitle
blogPost ^. #title
blogPost.title

There's another instance defined on SqlExpr (Entity (Maybe rec)), which allows you to project from a LEFT JOINed entity.

Since: esqueleto-3.5.4.0

Instance details

Defined in Database.Esqueleto.Internal.Internal

Methods

getField :: SqlExpr (Entity rec) -> SqlExpr (Value typ) #

(PersistEntity rec, PersistField typ, SymbolToField sym rec typ) => HasField (sym :: Symbol) (SqlExpr (Maybe (Entity rec))) (SqlExpr (Value (Maybe typ)))

This instance allows you to use record.field notation with GC 9.2's OverloadedRecordDot extension.

Example:

-- persistent model:
Person
    name         Text

BlogPost
    title        Text
    authorId     PersonId

-- query:

select $ do
    (p :& bp) <- from $
        table Person
        leftJoin table BlogPost
        on do
            \(p :& bp) ->
                just p.id ==. bp.authorId
    pure (p.name, bp.title)

The following forms are all equivalent:

blogPost :: SqlExpr (Maybe (Entity BlogPost))

blogPost ?. BlogPostTitle
blogPost ?. #title
blogPost.title

Since: esqueleto-3.5.4.0

Instance details

Defined in Database.Esqueleto.Internal.Internal

Methods

getField :: SqlExpr (Maybe (Entity rec)) -> SqlExpr (Value (Maybe typ)) #

(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 #

(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] #

(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 #

Colored (Entity LnChan) Source # 
Instance details

Defined in BtcLsp.Yesod.Data.Colored

ToMaybe (SqlExpr (Entity a)) 
Instance details

Defined in Database.Esqueleto.Experimental.ToMaybe

Associated Types

type ToMaybeT (SqlExpr (Entity a)) #

Methods

toMaybe :: SqlExpr (Entity a) -> ToMaybeT (SqlExpr (Entity a)) #

FromPreprocess (SqlExpr (Entity val)) => From (SqlExpr (Entity val)) 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Methods

from_ :: SqlQuery (SqlExpr (Entity val)) #

FromPreprocess (SqlExpr (Maybe (Entity val))) => From (SqlExpr (Maybe (Entity val))) 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Methods

from_ :: SqlQuery (SqlExpr (Maybe (Entity val))) #

(PersistEntity val, BackendCompatible SqlBackend (PersistEntityBackend val)) => FromPreprocess (SqlExpr (Entity val)) 
Instance details

Defined in Database.Esqueleto.Internal.Internal

(PersistEntity val, BackendCompatible SqlBackend (PersistEntityBackend val)) => FromPreprocess (SqlExpr (Maybe (Entity val))) 
Instance details

Defined in Database.Esqueleto.Internal.Internal

(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 #

(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 #

(PersistEntity record, PersistField record, PersistField (Key record)) => PersistField (Entity record) 
Instance details

Defined in Database.Persist.Class.PersistEntity

(PersistField record, PersistEntity record) => PersistFieldSql (Entity record) 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy (Entity record) -> SqlType #

(PersistEntity record, PersistEntityBackend record ~ backend, IsPersistBackend backend) => RawSql (Entity record) 
Instance details

Defined in Database.Persist.Sql.Class

Methods

rawSqlCols :: (Text -> Text) -> Entity record -> (Int, [Text]) #

rawSqlColCountReason :: Entity record -> String #

rawSqlProcessRow :: [PersistValue] -> Either Text (Entity record) #

PersistEntity a => SqlSelect (SqlExpr (Entity a)) (Entity a)

You may return an Entity from a select query.

Instance details

Defined in Database.Esqueleto.Internal.Internal

PersistEntity a => SqlSelect (SqlExpr (Maybe (Entity a))) (Maybe (Entity a))

You may return a possibly-NULL Entity from a select query.

Instance details

Defined in Database.Esqueleto.Internal.Internal

type Rep (Entity record) 
Instance details

Defined in Database.Persist.Class.PersistEntity

type Rep (Entity record) = D1 ('MetaData "Entity" "Database.Persist.Class.PersistEntity" "persistent-2.13.3.4-K7QWPYwATzA73w61MYpbGo" 'False) (C1 ('MetaCons "Entity" 'PrefixI 'True) (S1 ('MetaSel ('Just "entityKey") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Key record)) :*: S1 ('MetaSel ('Just "entityVal") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 record)))
type ToMaybeT (SqlExpr (Entity a)) 
Instance details

Defined in Database.Esqueleto.Experimental.ToMaybe

class PathPiece s where #

Methods

fromPathPiece :: Text -> Maybe s #

toPathPiece :: s -> Text #

Instances

Instances details
PathPiece Int16 
Instance details

Defined in Web.PathPieces

PathPiece Int32 
Instance details

Defined in Web.PathPieces

PathPiece Int64 
Instance details

Defined in Web.PathPieces

PathPiece Int8 
Instance details

Defined in Web.PathPieces

PathPiece Word16 
Instance details

Defined in Web.PathPieces

PathPiece Word32 
Instance details

Defined in Web.PathPieces

PathPiece Word64 
Instance details

Defined in Web.PathPieces

PathPiece RHashHex Source # 
Instance details

Defined in BtcLsp.Data.Type

PathPiece SwapHash Source # 
Instance details

Defined in BtcLsp.Data.Type

PathPiece SwapStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

PathPiece Code Source # 
Instance details

Defined in BtcLsp.Yesod.Data.Language

PathPiece PaymentRequest Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Methods

fromPathPiece :: Text -> Maybe PaymentRequest #

toPathPiece :: PaymentRequest -> Text #

PathPiece PersistValue 
Instance details

Defined in Database.Persist.PersistValue

PathPiece Checkmark 
Instance details

Defined in Database.Persist.Types.Base

PathPiece Text 
Instance details

Defined in Web.PathPieces

PathPiece Text 
Instance details

Defined in Web.PathPieces

PathPiece Day 
Instance details

Defined in Web.PathPieces

PathPiece UTCTime Source # 
Instance details

Defined in BtcLsp.Data.Orphan

PathPiece String 
Instance details

Defined in Web.PathPieces

PathPiece Word8 
Instance details

Defined in Web.PathPieces

PathPiece Integer 
Instance details

Defined in Web.PathPieces

PathPiece () 
Instance details

Defined in Web.PathPieces

Methods

fromPathPiece :: Text -> Maybe () #

toPathPiece :: () -> Text #

PathPiece Bool 
Instance details

Defined in Web.PathPieces

PathPiece Int 
Instance details

Defined in Web.PathPieces

PathPiece Word 
Instance details

Defined in Web.PathPieces

PathPiece (OnChainAddress mrel) Source # 
Instance details

Defined in BtcLsp.Data.Smart

PathPiece (LnInvoice mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

fromPathPiece :: Text -> Maybe (LnInvoice mrel) #

toPathPiece :: LnInvoice mrel -> Text #

PathPiece (UnsafeOnChainAddress mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

PathPiece (Uuid tab) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

fromPathPiece :: Text -> Maybe (Uuid tab) #

toPathPiece :: Uuid tab -> Text #

PathPiece (Key Block) Source # 
Instance details

Defined in BtcLsp.Storage.Model

PathPiece (Key LnChan) Source # 
Instance details

Defined in BtcLsp.Storage.Model

PathPiece (Key SwapIntoLn) Source # 
Instance details

Defined in BtcLsp.Storage.Model

PathPiece (Key SwapUtxo) Source # 
Instance details

Defined in BtcLsp.Storage.Model

PathPiece (Key User) Source # 
Instance details

Defined in BtcLsp.Storage.Model

PathPiece a => PathPiece (Maybe a) 
Instance details

Defined in Web.PathPieces

data IdentityT (f :: k -> Type) (a :: k) #

The trivial monad transformer, which maps a monad to an equivalent monad.

Instances

Instances details
MonadBaseControl b m => MonadBaseControl b (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Control

Associated Types

type StM (IdentityT m) a #

Methods

liftBaseWith :: (RunInBase (IdentityT m) b -> b a) -> IdentityT m a #

restoreM :: StM (IdentityT m) 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 #

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 #

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 #

MonadTransControl (IdentityT :: (Type -> Type) -> Type -> Type) 
Instance details

Defined in Control.Monad.Trans.Control

Associated Types

type StT IdentityT a #

Methods

liftWith :: Monad m => (Run IdentityT -> m a) -> IdentityT m a #

restoreT :: Monad m => m (StT IdentityT 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 #

Representable m => Representable (IdentityT m) 
Instance details

Defined in Data.Functor.Rep

Associated Types

type Rep (IdentityT m) #

Methods

tabulate :: (Rep (IdentityT m) -> a) -> IdentityT m a #

index :: IdentityT m a -> Rep (IdentityT m) -> a #

MonadFail m => MonadFail (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

fail :: String -> 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 #

MonadIO m => MonadIO (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

liftIO :: IO a -> IdentityT m a #

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) #

Foldable f => Foldable (IdentityT f) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

fold :: Monoid m => IdentityT f m -> m #

foldMap :: Monoid m => (a -> m) -> IdentityT f a -> m #

foldMap' :: Monoid m => (a -> m) -> IdentityT f a -> m #

foldr :: (a -> b -> b) -> b -> IdentityT f a -> b #

foldr' :: (a -> b -> b) -> b -> IdentityT f a -> b #

foldl :: (b -> a -> b) -> b -> IdentityT f a -> b #

foldl' :: (b -> a -> b) -> b -> IdentityT f a -> b #

foldr1 :: (a -> a -> a) -> IdentityT f a -> a #

foldl1 :: (a -> a -> a) -> IdentityT f a -> a #

toList :: IdentityT f a -> [a] #

null :: IdentityT f a -> Bool #

length :: IdentityT f a -> Int #

elem :: Eq a => a -> IdentityT f a -> Bool #

maximum :: Ord a => IdentityT f a -> a #

minimum :: Ord a => IdentityT f a -> a #

sum :: Num a => IdentityT f a -> a #

product :: Num a => IdentityT f a -> a #

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 #

Contravariant f => Contravariant (IdentityT f) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

contramap :: (a' -> a) -> IdentityT f a -> IdentityT f a' #

(>$) :: b -> IdentityT f b -> IdentityT 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) #

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] #

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 => 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 #

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 #

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 #

Zip m => Zip (IdentityT m) 
Instance details

Defined in Data.ChunkedZip

Methods

zipWith :: (a -> b -> c) -> IdentityT m a -> IdentityT m b -> IdentityT m c #

zip :: IdentityT m a -> IdentityT m b -> IdentityT m (a, b) #

zap :: IdentityT m (a -> b) -> IdentityT m a -> IdentityT m b #

unzip :: IdentityT m (a, b) -> (IdentityT m a, IdentityT m b) #

Comonad w => Comonad (IdentityT w) 
Instance details

Defined in Control.Comonad

Methods

extract :: IdentityT w a -> a #

duplicate :: IdentityT w a -> IdentityT w (IdentityT w a) #

extend :: (IdentityT w a -> b) -> IdentityT w a -> IdentityT w b #

ComonadApply w => ComonadApply (IdentityT w) 
Instance details

Defined in Control.Comonad

Methods

(<@>) :: IdentityT w (a -> b) -> IdentityT w a -> IdentityT w b #

(@>) :: IdentityT w a -> IdentityT w b -> IdentityT w b #

(<@) :: IdentityT w a -> IdentityT w b -> IdentityT w 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 #

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 #

(KatipContext m, Katip (IdentityT m)) => KatipContext (IdentityT m) 
Instance details

Defined in Katip.Monadic

FoldableWithKey m => FoldableWithKey (IdentityT m) 
Instance details

Defined in Data.Key

Methods

toKeyedList :: IdentityT m a -> [(Key (IdentityT m), a)] #

foldMapWithKey :: Monoid m0 => (Key (IdentityT m) -> a -> m0) -> IdentityT m a -> m0 #

foldrWithKey :: (Key (IdentityT m) -> a -> b -> b) -> b -> IdentityT m a -> b #

foldlWithKey :: (b -> Key (IdentityT m) -> a -> b) -> b -> IdentityT m a -> b #

FoldableWithKey1 m => FoldableWithKey1 (IdentityT m) 
Instance details

Defined in Data.Key

Methods

foldMapWithKey1 :: Semigroup m0 => (Key (IdentityT m) -> a -> m0) -> IdentityT m a -> m0 #

Indexable m => Indexable (IdentityT m) 
Instance details

Defined in Data.Key

Methods

index :: IdentityT m a -> Key (IdentityT m) -> a #

Keyed m => Keyed (IdentityT m) 
Instance details

Defined in Data.Key

Methods

mapWithKey :: (Key (IdentityT m) -> a -> b) -> IdentityT m a -> IdentityT m b #

Lookup m => Lookup (IdentityT m) 
Instance details

Defined in Data.Key

Methods

lookup :: Key (IdentityT m) -> IdentityT m a -> Maybe a #

TraversableWithKey m => TraversableWithKey (IdentityT m) 
Instance details

Defined in Data.Key

Methods

traverseWithKey :: Applicative f => (Key (IdentityT m) -> a -> f b) -> IdentityT m a -> f (IdentityT m b) #

mapWithKeyM :: Monad m0 => (Key (IdentityT m) -> a -> m0 b) -> IdentityT m a -> m0 (IdentityT m b) #

TraversableWithKey1 m => TraversableWithKey1 (IdentityT m) 
Instance details

Defined in Data.Key

Methods

traverseWithKey1 :: Apply f => (Key (IdentityT m) -> a -> f b) -> IdentityT m a -> f (IdentityT m b) #

Zip m => Zip (IdentityT m) 
Instance details

Defined in Data.Key

Methods

zipWith :: (a -> b -> c) -> IdentityT m a -> IdentityT m b -> IdentityT m c #

zip :: IdentityT m a -> IdentityT m b -> IdentityT m (a, b) #

zap :: IdentityT m (a -> b) -> IdentityT m a -> IdentityT m b #

ZipWithKey m => ZipWithKey (IdentityT m) 
Instance details

Defined in Data.Key

Methods

zipWithKey :: (Key (IdentityT m) -> a -> b -> c) -> IdentityT m a -> IdentityT m b -> IdentityT m c #

zapWithKey :: IdentityT m (Key (IdentityT m) -> a -> b) -> IdentityT m a -> IdentityT m b #

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 ()) #

PrimBase m => PrimBase (IdentityT m)

Since: primitive-0.6.2.0

Instance details

Defined in Control.Monad.Primitive

Methods

internal :: IdentityT m a -> State# (PrimState (IdentityT m)) -> (# State# (PrimState (IdentityT m)), a #) #

PrimMonad m => PrimMonad (IdentityT m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (IdentityT m) #

Methods

primitive :: (State# (PrimState (IdentityT m)) -> (# State# (PrimState (IdentityT m)), a #)) -> IdentityT m a #

MonadResource m => MonadResource (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

liftResourceT :: ResourceT IO a -> IdentityT m a #

Apply w => Apply (IdentityT w) 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(<.>) :: IdentityT w (a -> b) -> IdentityT w a -> IdentityT w b #

(.>) :: IdentityT w a -> IdentityT w b -> IdentityT w b #

(<.) :: IdentityT w a -> IdentityT w b -> IdentityT w a #

liftF2 :: (a -> b -> c) -> IdentityT w a -> IdentityT w b -> IdentityT w c #

Bind m => Bind (IdentityT m) 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(>>-) :: IdentityT m a -> (a -> IdentityT m b) -> IdentityT m b #

join :: IdentityT m (IdentityT m a) -> IdentityT m a #

MonadUnliftIO m => MonadUnliftIO (IdentityT m) 
Instance details

Defined in Control.Monad.IO.Unlift

Methods

withRunInIO :: ((forall a. IdentityT m a -> IO a) -> IO b) -> IdentityT m b #

MonadHandler m => MonadHandler (IdentityT m) 
Instance details

Defined in Yesod.Core.Class.Handler

Associated Types

type HandlerSite (IdentityT m) #

type SubHandlerSite (IdentityT m) #

MonadWidget m => MonadWidget (IdentityT m) 
Instance details

Defined in Yesod.Core.Class.Handler

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 #

(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 #

(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 #

Foldable f => MonoFoldable (IdentityT f a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (IdentityT f a) -> m) -> IdentityT f a -> m #

ofoldr :: (Element (IdentityT f a) -> b -> b) -> b -> IdentityT f a -> b #

ofoldl' :: (a0 -> Element (IdentityT f a) -> a0) -> a0 -> IdentityT f a -> a0 #

otoList :: IdentityT f a -> [Element (IdentityT f a)] #

oall :: (Element (IdentityT f a) -> Bool) -> IdentityT f a -> Bool #

oany :: (Element (IdentityT f a) -> Bool) -> IdentityT f a -> Bool #

onull :: IdentityT f a -> Bool #

olength :: IdentityT f a -> Int #

olength64 :: IdentityT f a -> Int64 #

ocompareLength :: Integral i => IdentityT f a -> i -> Ordering #

otraverse_ :: Applicative f0 => (Element (IdentityT f a) -> f0 b) -> IdentityT f a -> f0 () #

ofor_ :: Applicative f0 => IdentityT f a -> (Element (IdentityT f a) -> f0 b) -> f0 () #

omapM_ :: Applicative m => (Element (IdentityT f a) -> m ()) -> IdentityT f a -> m () #

oforM_ :: Applicative m => IdentityT f a -> (Element (IdentityT f a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (IdentityT f a) -> m a0) -> a0 -> IdentityT f a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (IdentityT f a) -> m) -> IdentityT f a -> m #

ofoldr1Ex :: (Element (IdentityT f a) -> Element (IdentityT f a) -> Element (IdentityT f a)) -> IdentityT f a -> Element (IdentityT f a) #

ofoldl1Ex' :: (Element (IdentityT f a) -> Element (IdentityT f a) -> Element (IdentityT f a)) -> IdentityT f a -> Element (IdentityT f a) #

headEx :: IdentityT f a -> Element (IdentityT f a) #

lastEx :: IdentityT f a -> Element (IdentityT f a) #

unsafeHead :: IdentityT f a -> Element (IdentityT f a) #

unsafeLast :: IdentityT f a -> Element (IdentityT f a) #

maximumByEx :: (Element (IdentityT f a) -> Element (IdentityT f a) -> Ordering) -> IdentityT f a -> Element (IdentityT f a) #

minimumByEx :: (Element (IdentityT f a) -> Element (IdentityT f a) -> Ordering) -> IdentityT f a -> Element (IdentityT f a) #

oelem :: Element (IdentityT f a) -> IdentityT f a -> Bool #

onotElem :: Element (IdentityT f a) -> IdentityT f a -> Bool #

Functor m => MonoFunctor (IdentityT m a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (IdentityT m a) -> Element (IdentityT m a)) -> IdentityT m a -> IdentityT m a #

Applicative m => MonoPointed (IdentityT m a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (IdentityT m a) -> IdentityT m a #

Traversable f => MonoTraversable (IdentityT f a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f0 => (Element (IdentityT f a) -> f0 (Element (IdentityT f a))) -> IdentityT f a -> f0 (IdentityT f a) #

omapM :: Applicative m => (Element (IdentityT f a) -> m (Element (IdentityT f a))) -> IdentityT f a -> m (IdentityT f a) #

type Rep1 (IdentityT f :: k -> Type) 
Instance details

Defined in Control.Monad.Trans.Instances

type Rep1 (IdentityT f :: k -> Type) = D1 ('MetaData "IdentityT" "Control.Monad.Trans.Identity" "transformers-0.5.6.2-3aDaDWB36o65bk35C5q119" 'True) (C1 ('MetaCons "IdentityT" 'PrefixI 'True) (S1 ('MetaSel ('Just "runIdentityT") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 f)))
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 Rep (IdentityT m) 
Instance details

Defined in Data.Functor.Rep

type Rep (IdentityT m) = Rep m
type Key (IdentityT m) 
Instance details

Defined in Data.Key

type Key (IdentityT m) = Key m
type Magnified (IdentityT m) 
Instance details

Defined in Lens.Micro.Mtl.Internal

type Zoomed (IdentityT m) 
Instance details

Defined in Lens.Micro.Mtl.Internal

type Zoomed (IdentityT m) = Zoomed m
type PrimState (IdentityT m) 
Instance details

Defined in Control.Monad.Primitive

type HandlerSite (IdentityT m) 
Instance details

Defined in Yesod.Core.Class.Handler

type SubHandlerSite (IdentityT m) 
Instance details

Defined in Yesod.Core.Class.Handler

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
type Rep (IdentityT f a) 
Instance details

Defined in Control.Monad.Trans.Instances

type Rep (IdentityT f a) = D1 ('MetaData "IdentityT" "Control.Monad.Trans.Identity" "transformers-0.5.6.2-3aDaDWB36o65bk35C5q119" 'True) (C1 ('MetaCons "IdentityT" 'PrefixI 'True) (S1 ('MetaSel ('Just "runIdentityT") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (f a))))
type Element (IdentityT m a) 
Instance details

Defined in Data.MonoTraversable

type Element (IdentityT m a) = a

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

Instances details
MonadBaseControl b m => MonadBaseControl b (StateT s m) 
Instance details

Defined in Control.Monad.Trans.Control

Associated Types

type StM (StateT s m) a #

Methods

liftBaseWith :: (RunInBase (StateT s m) b -> b a) -> StateT s m a #

restoreM :: StM (StateT s m) 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 #

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 => 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 #

MonadTransControl (StateT s) 
Instance details

Defined in Control.Monad.Trans.Control

Associated Types

type StT (StateT s) a #

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 #

MonadTrans (StateT s) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

lift :: Monad m => 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 #

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 #

MonadIO m => MonadIO (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

liftIO :: IO a -> StateT s m a #

Contravariant m => Contravariant (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

contramap :: (a' -> a) -> StateT s m a -> StateT s m a' #

(>$) :: b -> StateT s m b -> 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] #

(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 #

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 #

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 #

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 #

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 #

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

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 ()) #

PrimMonad m => PrimMonad (StateT s m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (StateT s m) #

Methods

primitive :: (State# (PrimState (StateT s m)) -> (# State# (PrimState (StateT s m)), a #)) -> StateT s m a #

MonadResource m => MonadResource (StateT s m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

liftResourceT :: ResourceT IO a -> StateT s m a #

Bind m => Apply (StateT s m) 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(<.>) :: StateT s m (a -> b) -> StateT s m a -> StateT s m b #

(.>) :: StateT s m a -> StateT s m b -> StateT s m b #

(<.) :: StateT s m a -> StateT s m b -> StateT s m a #

liftF2 :: (a -> b -> c) -> StateT s m a -> StateT s m b -> StateT s m c #

Bind m => Bind (StateT s m) 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(>>-) :: StateT s m a -> (a -> StateT s m b) -> StateT s m b #

join :: StateT s m (StateT s m a) -> StateT s m a #

MonadHandler m => MonadHandler (StateT s m) 
Instance details

Defined in Yesod.Core.Class.Handler

Associated Types

type HandlerSite (StateT s m) #

type SubHandlerSite (StateT s m) #

MonadWidget m => MonadWidget (StateT s m) 
Instance details

Defined in Yesod.Core.Class.Handler

Methods

liftWidget :: WidgetFor (HandlerSite (StateT s m)) a -> StateT s m a #

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 #

Functor m => MonoFunctor (StateT s m a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (StateT s m a) -> Element (StateT s m a)) -> StateT s m a -> StateT s m a #

Applicative m => MonoPointed (StateT s m a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (StateT s m a) -> StateT s m a #

type StT (StateT s) a 
Instance details

Defined in Control.Monad.Trans.Control

type StT (StateT s) a = (a, s)
type Zoomed (StateT s z) 
Instance details

Defined in Lens.Micro.Mtl.Internal

type Zoomed (StateT s z) = Focusing z
type PrimState (StateT s m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (StateT s m) = PrimState m
type HandlerSite (StateT s m) 
Instance details

Defined in Yesod.Core.Class.Handler

type SubHandlerSite (StateT s m) 
Instance details

Defined in Yesod.Core.Class.Handler

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 Rep (StateT s m a) 
Instance details

Defined in Control.Monad.Trans.Instances

type Rep (StateT s m a) = D1 ('MetaData "StateT" "Control.Monad.Trans.State.Strict" "transformers-0.5.6.2-3aDaDWB36o65bk35C5q119" 'True) (C1 ('MetaCons "StateT" 'PrefixI 'True) (S1 ('MetaSel ('Just "runStateT") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (s -> m (a, s)))))
type Rep (StateT s m a) 
Instance details

Defined in Control.Monad.Trans.Instances

type Rep (StateT s m a) = D1 ('MetaData "StateT" "Control.Monad.Trans.State.Strict" "transformers-0.5.6.2-3aDaDWB36o65bk35C5q119" 'True) (C1 ('MetaCons "StateT" 'PrefixI 'True) (S1 ('MetaSel ('Just "runStateT") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (s -> m (a, s)))))
type Element (StateT s m a) 
Instance details

Defined in Data.MonoTraversable

type Element (StateT s m a) = a

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

Instances details
MonadTransControl MaybeT 
Instance details

Defined in Control.Monad.Trans.Control

Associated Types

type StT MaybeT a #

Methods

liftWith :: Monad m => (Run MaybeT -> m a) -> MaybeT m a #

restoreT :: Monad m => m (StT MaybeT a) -> MaybeT m a #

MonadTrans MaybeT 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

lift :: Monad m => 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 #

Methods

liftBaseWith :: (RunInBase (MaybeT m) b -> b a) -> MaybeT m a #

restoreM :: StM (MaybeT m) 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 #

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 #

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 #

Monad m => MonadFail (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

fail :: String -> 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 #

MonadIO m => MonadIO (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

liftIO :: IO a -> MaybeT m a #

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) #

Foldable f => Foldable (MaybeT f) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

fold :: Monoid m => MaybeT f m -> m #

foldMap :: Monoid m => (a -> m) -> MaybeT f a -> m #

foldMap' :: Monoid m => (a -> m) -> MaybeT f a -> m #

foldr :: (a -> b -> b) -> b -> MaybeT f a -> b #

foldr' :: (a -> b -> b) -> b -> MaybeT f a -> b #

foldl :: (b -> a -> b) -> b -> MaybeT f a -> b #

foldl' :: (b -> a -> b) -> b -> MaybeT f a -> b #

foldr1 :: (a -> a -> a) -> MaybeT f a -> a #

foldl1 :: (a -> a -> a) -> MaybeT f a -> a #

toList :: MaybeT f a -> [a] #

null :: MaybeT f a -> Bool #

length :: MaybeT f a -> Int #

elem :: Eq a => a -> MaybeT f a -> Bool #

maximum :: Ord a => MaybeT f a -> a #

minimum :: Ord a => MaybeT f a -> a #

sum :: Num a => MaybeT f a -> a #

product :: Num a => MaybeT f a -> a #

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 #

Contravariant m => Contravariant (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

contramap :: (a' -> a) -> MaybeT m a -> MaybeT m a' #

(>$) :: b -> MaybeT m b -> MaybeT m 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) #

(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] #

(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 #

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 #

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 #

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 #

MonadCatch m => MonadCatch (MaybeT m)

Catches exceptions from the base monad.

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)

Since: exceptions-0.10.0

Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. MaybeT m a -> MaybeT m a) -> MaybeT m b) -> MaybeT m b #

uninterruptibleMask :: ((forall a. MaybeT m a -> MaybeT m a) -> MaybeT m b) -> MaybeT m b #

generalBracket :: MaybeT m a -> (a -> ExitCase b -> MaybeT m c) -> (a -> MaybeT m b) -> MaybeT m (b, c) #

MonadThrow m => MonadThrow (MaybeT m)

Throws exceptions into the base monad.

Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> MaybeT m a #

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

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 ()) #

PrimMonad m => PrimMonad (MaybeT m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (MaybeT m) #

Methods

primitive :: (State# (PrimState (MaybeT m)) -> (# State# (PrimState (MaybeT m)), a #)) -> MaybeT m a #

MonadResource m => MonadResource (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

liftResourceT :: ResourceT IO a -> MaybeT m a #

(Functor m, Monad m) => Apply (MaybeT m) 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(<.>) :: MaybeT m (a -> b) -> MaybeT m a -> MaybeT m b #

(.>) :: MaybeT m a -> MaybeT m b -> MaybeT m b #

(<.) :: MaybeT m a -> MaybeT m b -> MaybeT m a #

liftF2 :: (a -> b -> c) -> MaybeT m a -> MaybeT m b -> MaybeT m c #

(Functor m, Monad m) => Bind (MaybeT m) 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(>>-) :: MaybeT m a -> (a -> MaybeT m b) -> MaybeT m b #

join :: MaybeT m (MaybeT m a) -> MaybeT m a #

MonadHandler m => MonadHandler (MaybeT m) 
Instance details

Defined in Yesod.Core.Class.Handler

Associated Types

type HandlerSite (MaybeT m) #

type SubHandlerSite (MaybeT m) #

MonadWidget m => MonadWidget (MaybeT m) 
Instance details

Defined in Yesod.Core.Class.Handler

Methods

liftWidget :: WidgetFor (HandlerSite (MaybeT m)) a -> MaybeT m a #

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 #

(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 #

(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 #

Foldable f => MonoFoldable (MaybeT f a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (MaybeT f a) -> m) -> MaybeT f a -> m #

ofoldr :: (Element (MaybeT f a) -> b -> b) -> b -> MaybeT f a -> b #

ofoldl' :: (a0 -> Element (MaybeT f a) -> a0) -> a0 -> MaybeT f a -> a0 #

otoList :: MaybeT f a -> [Element (MaybeT f a)] #

oall :: (Element (MaybeT f a) -> Bool) -> MaybeT f a -> Bool #

oany :: (Element (MaybeT f a) -> Bool) -> MaybeT f a -> Bool #

onull :: MaybeT f a -> Bool #

olength :: MaybeT f a -> Int #

olength64 :: MaybeT f a -> Int64 #

ocompareLength :: Integral i => MaybeT f a -> i -> Ordering #

otraverse_ :: Applicative f0 => (Element (MaybeT f a) -> f0 b) -> MaybeT f a -> f0 () #

ofor_ :: Applicative f0 => MaybeT f a -> (Element (MaybeT f a) -> f0 b) -> f0 () #

omapM_ :: Applicative m => (Element (MaybeT f a) -> m ()) -> MaybeT f a -> m () #

oforM_ :: Applicative m => MaybeT f a -> (Element (MaybeT f a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (MaybeT f a) -> m a0) -> a0 -> MaybeT f a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (MaybeT f a) -> m) -> MaybeT f a -> m #

ofoldr1Ex :: (Element (MaybeT f a) -> Element (MaybeT f a) -> Element (MaybeT f a)) -> MaybeT f a -> Element (MaybeT f a) #

ofoldl1Ex' :: (Element (MaybeT f a) -> Element (MaybeT f a) -> Element (MaybeT f a)) -> MaybeT f a -> Element (MaybeT f a) #

headEx :: MaybeT f a -> Element (MaybeT f a) #

lastEx :: MaybeT f a -> Element (MaybeT f a) #

unsafeHead :: MaybeT f a -> Element (MaybeT f a) #

unsafeLast :: MaybeT f a -> Element (MaybeT f a) #

maximumByEx :: (Element (MaybeT f a) -> Element (MaybeT f a) -> Ordering) -> MaybeT f a -> Element (MaybeT f a) #

minimumByEx :: (Element (MaybeT f a) -> Element (MaybeT f a) -> Ordering) -> MaybeT f a -> Element (MaybeT f a) #

oelem :: Element (MaybeT f a) -> MaybeT f a -> Bool #

onotElem :: Element (MaybeT f a) -> MaybeT f a -> Bool #

Functor m => MonoFunctor (MaybeT m a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (MaybeT m a) -> Element (MaybeT m a)) -> MaybeT m a -> MaybeT m a #

Applicative f => MonoPointed (MaybeT f a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (MaybeT f a) -> MaybeT f a #

Traversable f => MonoTraversable (MaybeT f a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f0 => (Element (MaybeT f a) -> f0 (Element (MaybeT f a))) -> MaybeT f a -> f0 (MaybeT f a) #

omapM :: Applicative m => (Element (MaybeT f a) -> m (Element (MaybeT f a))) -> MaybeT f a -> m (MaybeT f a) #

type StT MaybeT a 
Instance details

Defined in Control.Monad.Trans.Control

type StT MaybeT a = Maybe a
type Zoomed (MaybeT m) 
Instance details

Defined in Lens.Micro.Mtl.Internal

type PrimState (MaybeT m) 
Instance details

Defined in Control.Monad.Primitive

type HandlerSite (MaybeT m) 
Instance details

Defined in Yesod.Core.Class.Handler

type SubHandlerSite (MaybeT m) 
Instance details

Defined in Yesod.Core.Class.Handler

type StM (MaybeT m) a 
Instance details

Defined in Control.Monad.Trans.Control

type StM (MaybeT m) a = ComposeSt MaybeT m a
type Rep1 (MaybeT m :: Type -> Type) 
Instance details

Defined in Control.Monad.Trans.Instances

type Rep1 (MaybeT m :: Type -> Type) = D1 ('MetaData "MaybeT" "Control.Monad.Trans.Maybe" "transformers-0.5.6.2-3aDaDWB36o65bk35C5q119" 'True) (C1 ('MetaCons "MaybeT" 'PrefixI 'True) (S1 ('MetaSel ('Just "runMaybeT") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (m :.: Rec1 Maybe)))
type Rep (MaybeT m a) 
Instance details

Defined in Control.Monad.Trans.Instances

type Rep (MaybeT m a) = D1 ('MetaData "MaybeT" "Control.Monad.Trans.Maybe" "transformers-0.5.6.2-3aDaDWB36o65bk35C5q119" 'True) (C1 ('MetaCons "MaybeT" 'PrefixI 'True) (S1 ('MetaSel ('Just "runMaybeT") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (m (Maybe a)))))
type Element (MaybeT m a) 
Instance details

Defined in Data.MonoTraversable

type Element (MaybeT m a) = 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

Instances details
MonadBaseControl b m => MonadBaseControl b (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Control

Associated Types

type StM (ExceptT e m) a #

Methods

liftBaseWith :: (RunInBase (ExceptT e m) b -> b a) -> ExceptT e m a #

restoreM :: StM (ExceptT e m) 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 #

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 #

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 #

MonadTransControl (ExceptT e) 
Instance details

Defined in Control.Monad.Trans.Control

Associated Types

type StT (ExceptT e) a #

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 #

MonadTrans (ExceptT e) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

lift :: Monad m => 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 #

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 #

MonadIO m => MonadIO (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

liftIO :: IO a -> ExceptT e m a #

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) #

Foldable f => Foldable (ExceptT e f) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

fold :: Monoid m => ExceptT e f m -> m #

foldMap :: Monoid m => (a -> m) -> ExceptT e f a -> m #

foldMap' :: Monoid m => (a -> m) -> ExceptT e f a -> m #

foldr :: (a -> b -> b) -> b -> ExceptT e f a -> b #

foldr' :: (a -> b -> b) -> b -> ExceptT e f a -> b #

foldl :: (b -> a -> b) -> b -> ExceptT e f a -> b #

foldl' :: (b -> a -> b) -> b -> ExceptT e f a -> b #

foldr1 :: (a -> a -> a) -> ExceptT e f a -> a #

foldl1 :: (a -> a -> a) -> ExceptT e f a -> a #

toList :: ExceptT e f a -> [a] #

null :: ExceptT e f a -> Bool #

length :: ExceptT e f a -> Int #

elem :: Eq a => a -> ExceptT e f a -> Bool #

maximum :: Ord a => ExceptT e f a -> a #

minimum :: Ord a => ExceptT e f a -> a #

sum :: Num a => ExceptT e f a -> a #

product :: Num a => ExceptT e f a -> a #

(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 #

Contravariant m => Contravariant (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

contramap :: (a' -> a) -> ExceptT e m a -> ExceptT e m a' #

(>$) :: b -> ExceptT e m b -> ExceptT e m 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) #

(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] #

(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 #

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 #

Monad m => Monad (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

(>>=) :: ExceptT e m a -> (a -> ExceptT e m b) -> ExceptT e m b #

(>>) :: ExceptT e m a -> ExceptT e m b -> ExceptT e m b #

return :: a -> ExceptT e m a #

(Monad m, 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 #

MonadCatch m => MonadCatch (ExceptT e m)

Catches exceptions from the base monad.

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)

Since: exceptions-0.9.0

Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. ExceptT e m a -> ExceptT e m a) -> ExceptT e m b) -> ExceptT e m b #

uninterruptibleMask :: ((forall a. ExceptT e m a -> ExceptT e m a) -> ExceptT e m b) -> ExceptT e m b #

generalBracket :: ExceptT e m a -> (a -> ExitCase b -> ExceptT e m c) -> (a -> ExceptT e m b) -> ExceptT e m (b, c) #

MonadThrow m => MonadThrow (ExceptT e m)

Throws exceptions into the base monad.

Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e0 => e0 -> ExceptT e m a #

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

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 ()) #

PrimMonad m => PrimMonad (ExceptT e m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (ExceptT e m) #

Methods

primitive :: (State# (PrimState (ExceptT e m)) -> (# State# (PrimState (ExceptT e m)), a #)) -> ExceptT e m a #

MonadResource m => MonadResource (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

liftResourceT :: ResourceT IO a -> ExceptT e m a #

(Functor m, Monad m) => Apply (ExceptT e m) 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(<.>) :: ExceptT e m (a -> b) -> ExceptT e m a -> ExceptT e m b #

(.>) :: ExceptT e m a -> ExceptT e m b -> ExceptT e m b #

(<.) :: ExceptT e m a -> ExceptT e m b -> ExceptT e m a #

liftF2 :: (a -> b -> c) -> ExceptT e m a -> ExceptT e m b -> ExceptT e m c #

(Functor m, Monad m) => Bind (ExceptT e m) 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(>>-) :: ExceptT e m a -> (a -> ExceptT e m b) -> ExceptT e m b #

join :: ExceptT e m (ExceptT e m a) -> ExceptT e m a #

MonadHandler m => MonadHandler (ExceptT e m) 
Instance details

Defined in Yesod.Core.Class.Handler

Associated Types

type HandlerSite (ExceptT e m) #

type SubHandlerSite (ExceptT e m) #

MonadWidget m => MonadWidget (ExceptT e m) 
Instance details

Defined in Yesod.Core.Class.Handler

Methods

liftWidget :: WidgetFor (HandlerSite (ExceptT e m)) a -> ExceptT e m a #

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 #

(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 #

(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 #

type StT (ExceptT e) a 
Instance details

Defined in Control.Monad.Trans.Control

type StT (ExceptT e) a = Either e a
type Rep1 (ExceptT e m :: Type -> Type) 
Instance details

Defined in Control.Monad.Trans.Instances

type Rep1 (ExceptT e m :: Type -> Type) = D1 ('MetaData "ExceptT" "Control.Monad.Trans.Except" "transformers-0.5.6.2-3aDaDWB36o65bk35C5q119" 'True) (C1 ('MetaCons "ExceptT" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (m :.: Rec1 (Either e))))
type Zoomed (ExceptT e m) 
Instance details

Defined in Lens.Micro.Mtl.Internal

type Zoomed (ExceptT e m) = FocusingErr e (Zoomed m)
type PrimState (ExceptT e m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ExceptT e m) = PrimState m
type HandlerSite (ExceptT e m) 
Instance details

Defined in Yesod.Core.Class.Handler

type SubHandlerSite (ExceptT e m) 
Instance details

Defined in Yesod.Core.Class.Handler

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
type Rep (ExceptT e m a) 
Instance details

Defined in Control.Monad.Trans.Instances

type Rep (ExceptT e m a) = D1 ('MetaData "ExceptT" "Control.Monad.Trans.Except" "transformers-0.5.6.2-3aDaDWB36o65bk35C5q119" 'True) (C1 ('MetaCons "ExceptT" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (m (Either e a)))))

nubOrd :: Ord a => [a] -> [a] #

\( O(n \log d) \). The nubOrd function removes duplicate elements from a list. In particular, it keeps only the first occurrence of each element. By using a Set internally it has better asymptotics than the standard nub function.

Strictness

nubOrd is strict in the elements of the list.

Efficiency note

When applicable, it is almost always better to use nubInt or nubIntOn instead of this function, although it can be a little worse in certain pathological cases. For example, to nub a list of characters, use

 nubIntOn fromEnum xs

Since: containers-0.6.0.1

data DiffTime #

This is a length of time, as measured by a clock. Conversion functions will treat it as seconds. It has a precision of 10^-12 s.

Instances

Instances details
FromJSON DiffTime

This instance includes a bounds check to prevent maliciously large inputs to fill up the memory of the target system. You can newtype Scientific and provide your own instance using withScientific if you want to allow larger inputs.

Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON DiffTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

Data DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DiffTime -> c DiffTime #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DiffTime #

toConstr :: DiffTime -> Constr #

dataTypeOf :: DiffTime -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DiffTime) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DiffTime) #

gmapT :: (forall b. Data b => b -> b) -> DiffTime -> DiffTime #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DiffTime -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DiffTime -> r #

gmapQ :: (forall d. Data d => d -> u) -> DiffTime -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DiffTime -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DiffTime -> m DiffTime #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DiffTime -> m DiffTime #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DiffTime -> m DiffTime #

Enum DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Num DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Fractional DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Real DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

RealFrac DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Methods

properFraction :: Integral b => DiffTime -> (b, DiffTime) #

truncate :: Integral b => DiffTime -> b #

round :: Integral b => DiffTime -> b #

ceiling :: Integral b => DiffTime -> b #

floor :: Integral b => DiffTime -> b #

Show DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

NFData DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Methods

rnf :: DiffTime -> () #

Eq DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Ord DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

getRandomBytes :: (MonadRandom m, ByteArray byteArray) => Int -> m byteArray #

hashWith :: (ByteArrayAccess ba, HashAlgorithm alg) => alg -> ba -> Digest alg #

Run the hash function but takes an explicit hash algorithm parameter

hashlazy :: HashAlgorithm a => ByteString -> Digest a #

Hash a lazy bytestring into a digest.

data SHA256 #

SHA256 cryptographic hash algorithm

Constructors

SHA256 

Instances

Instances details
Data SHA256 
Instance details

Defined in Crypto.Hash.SHA256

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SHA256 -> c SHA256 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SHA256 #

toConstr :: SHA256 -> Constr #

dataTypeOf :: SHA256 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SHA256) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SHA256) #

gmapT :: (forall b. Data b => b -> b) -> SHA256 -> SHA256 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SHA256 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SHA256 -> r #

gmapQ :: (forall d. Data d => d -> u) -> SHA256 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SHA256 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SHA256 -> m SHA256 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA256 -> m SHA256 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA256 -> m SHA256 #

Show SHA256 
Instance details

Defined in Crypto.Hash.SHA256

HashAlgorithm SHA256 
Instance details

Defined in Crypto.Hash.SHA256

HashAlgorithmPrefix SHA256 
Instance details

Defined in Crypto.Hash.SHA256

type HashBlockSize SHA256 
Instance details

Defined in Crypto.Hash.SHA256

type HashDigestSize SHA256 
Instance details

Defined in Crypto.Hash.SHA256

type HashInternalContextSize SHA256 
Instance details

Defined in Crypto.Hash.SHA256

data Digest a #

Represent a digest for a given hash algorithm.

This type is an instance of ByteArrayAccess from package memory. Module Data.ByteArray provides many primitives to work with those values including conversion to other types.

Creating a digest from a bytearray is also possible with function digestFromByteString.

Instances

Instances details
Data a => Data (Digest a) 
Instance details

Defined in Crypto.Hash.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Digest a -> c (Digest a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Digest a) #

toConstr :: Digest a -> Constr #

dataTypeOf :: Digest a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Digest a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Digest a)) #

gmapT :: (forall b. Data b => b -> b) -> Digest a -> Digest a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Digest a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Digest a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Digest a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Digest a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Digest a -> m (Digest a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Digest a -> m (Digest a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Digest a -> m (Digest a) #

HashAlgorithm a => Read (Digest a) 
Instance details

Defined in Crypto.Hash.Types

Show (Digest a) 
Instance details

Defined in Crypto.Hash.Types

Methods

showsPrec :: Int -> Digest a -> ShowS #

show :: Digest a -> String #

showList :: [Digest a] -> ShowS #

NFData (Digest a) 
Instance details

Defined in Crypto.Hash.Types

Methods

rnf :: Digest a -> () #

Eq (Digest a) 
Instance details

Defined in Crypto.Hash.Types

Methods

(==) :: Digest a -> Digest a -> Bool #

(/=) :: Digest a -> Digest a -> Bool #

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 #

ByteArrayAccess (Digest a) 
Instance details

Defined in Crypto.Hash.Types

Methods

length :: Digest a -> Int #

withByteArray :: Digest a -> (Ptr p -> IO a0) -> IO a0 #

copyByteArrayToPtr :: Digest a -> Ptr p -> IO () #

flipET :: forall (m :: Type -> Type) a b. Monad m => ExceptT a m b -> ExceptT b m a #

Flip the type variables of an ExceptT

handleE :: forall (m :: Type -> Type) a b r. Monad m => (a -> ExceptT b m r) -> ExceptT a m r -> ExceptT b m r #

catchE with the arguments flipped

failWithM :: Applicative m => e -> m (Maybe a) -> ExceptT e m a #

Convert an applicative Maybe value into the ExceptT monad

Named version of (!?) with arguments flipped

failWith :: forall (m :: Type -> Type) e a. Applicative m => e -> Maybe a -> ExceptT e m a #

Convert a Maybe value into the ExceptT monad

Named version of (??) with arguments flipped

throwE :: forall (m :: Type -> Type) e a. Monad m => e -> ExceptT e m a #

Signal an exception value e.

catchE #

Arguments

:: forall (m :: Type -> Type) e a e'. Monad m 
=> ExceptT e m a

the inner computation

-> (e -> ExceptT e' m a)

a handler for exceptions in the inner computation

-> ExceptT e' m a 

Handle an exception.

withExceptT :: forall (m :: Type -> Type) e e' a. Functor m => (e -> e') -> ExceptT e m a -> ExceptT e' m a #

Transform any exceptions thrown by the computation using the given function.

runExceptT :: ExceptT e m a -> m (Either e a) #

The inverse of ExceptT.

class MonadThrow m => MonadCatch (m :: Type -> Type) #

A class for monads which allow exceptions to be caught, in particular exceptions which were thrown by throwM.

Instances should obey the following law:

catch (throwM e) f = f e

Note that the ability to catch an exception does not guarantee that we can deal with all possible exit points from a computation. Some monads, such as continuation-based stacks, allow for more than just a success/failure strategy, and therefore catch cannot be used by those monads to properly implement a function such as finally. For more information, see MonadMask.

Minimal complete definition

catch

Instances

Instances details
MonadCatch STM 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => STM a -> (e -> STM a) -> STM a #

MonadCatch IO 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => IO a -> (e -> IO a) -> IO a #

e ~ SomeException => MonadCatch (Either e)

Since: exceptions-0.8.3

Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e0 => Either e a -> (e0 -> Either e a) -> Either e a #

Monad m => MonadCatch (CatchT m) 
Instance details

Defined in Control.Monad.Catch.Pure

Methods

catch :: Exception e => CatchT m a -> (e -> CatchT m a) -> CatchT 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 (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 (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 (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)

Catches exceptions from the base monad.

Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => MaybeT m a -> (e -> MaybeT m a) -> MaybeT m a #

(Functor f, MonadCatch m) => MonadCatch (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

catch :: Exception e => FreeT f m a -> (e -> FreeT f m a) -> FreeT f m a #

(Error e, MonadCatch m) => MonadCatch (ErrorT e m)

Catches exceptions from the base monad.

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)

Catches exceptions from the base monad.

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 (IdentityT m) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => IdentityT m a -> (e -> IdentityT m a) -> IdentityT 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 #

A class for monads which provide for the ability to account for all possible exit points from a computation, and to mask asynchronous exceptions. Continuation-based monads are invalid instances of this class.

Instances should ensure that, in the following code:

fg = f `finally` g

The action g is called regardless of what occurs within f, including async exceptions. Some monads allow f to abort the computation via other effects than throwing an exception. For simplicity, we will consider aborting and throwing an exception to be two forms of "throwing an error".

If f and g both throw an error, the error thrown by fg depends on which errors we're talking about. In a monad transformer stack, the deeper layers override the effects of the inner layers; for example, ExceptT e1 (Except e2) a represents a value of type Either e2 (Either e1 a), so throwing both an e1 and an e2 will result in Left e2. If f and g both throw an error from the same layer, instances should ensure that the error from g wins.

Effects other than throwing an error are also overriden by the deeper layers. For example, StateT s Maybe a represents a value of type s -> Maybe (a, s), so if an error thrown from f causes this function to return Nothing, any changes to the state which f also performed will be erased. As a result, g will see the state as it was before f. Once g completes, f's error will be rethrown, so g' state changes will be erased as well. This is the normal interaction between effects in a monad transformer stack.

By contrast, lifted-base's version of finally always discards all of g's non-IO effects, and g never sees any of f's non-IO effects, regardless of the layer ordering and regardless of whether f throws an error. This is not the result of interacting effects, but a consequence of MonadBaseControl's approach.

Methods

mask :: ((forall a. m a -> m a) -> m b) -> m b #

Runs an action with asynchronous exceptions disabled. The action is provided a method for restoring the async. environment to what it was at the mask call. See Control.Exception's mask.

uninterruptibleMask :: ((forall a. m a -> m a) -> m b) -> m b #

Like mask, but the masked computation is not interruptible (see Control.Exception's uninterruptibleMask. WARNING: Only use if you need to mask exceptions around an interruptible operation AND you can guarantee the interruptible operation will only block for a short period of time. Otherwise you render the program/thread unresponsive and/or unkillable.

generalBracket #

Arguments

:: m a

acquire some resource

-> (a -> ExitCase b -> m c)

release the resource, observing the outcome of the inner action

-> (a -> m b)

inner action to perform with the resource

-> m (b, c) 

A generalized version of bracket which uses ExitCase to distinguish the different exit cases, and returns the values of both the use and release actions. In practice, this extra information is rarely needed, so it is often more convenient to use one of the simpler functions which are defined in terms of this one, such as bracket, finally, onError, and bracketOnError.

This function exists because in order to thread their effects through the execution of bracket, monad transformers need values to be threaded from use to release and from release to the output value.

NOTE This method was added in version 0.9.0 of this library. Previously, implementation of functions like bracket and finally in this module were based on the mask and uninterruptibleMask functions only, disallowing some classes of tranformers from having MonadMask instances (notably multi-exit-point transformers like ExceptT). If you are a library author, you'll now need to provide an implementation for this method. The StateT implementation demonstrates most of the subtleties:

generalBracket acquire release use = StateT $ s0 -> do
  ((b, _s2), (c, s3)) <- generalBracket
    (runStateT acquire s0)
    ((resource, s1) exitCase -> case exitCase of
      ExitCaseSuccess (b, s2) -> runStateT (release resource (ExitCaseSuccess b)) s2

      -- In the two other cases, the base monad overrides use's state
      -- changes and the state reverts to s1.
      ExitCaseException e     -> runStateT (release resource (ExitCaseException e)) s1
      ExitCaseAbort           -> runStateT (release resource ExitCaseAbort) s1
    )
    ((resource, s1) -> runStateT (use resource) s1)
  return ((b, c), s3)

The StateT s m implementation of generalBracket delegates to the m implementation of generalBracket. The acquire, use, and release arguments given to StateT's implementation produce actions of type StateT s m a, StateT s m b, and StateT s m c. In order to run those actions in the base monad, we need to call runStateT, from which we obtain actions of type m (a, s), m (b, s), and m (c, s). Since each action produces the next state, it is important to feed the state produced by the previous action to the next action.

In the ExitCaseSuccess case, the state starts at s0, flows through acquire to become s1, flows through use to become s2, and finally flows through release to become s3. In the other two cases, release does not receive the value s2, so its action cannot see the state changes performed by use. This is fine, because in those two cases, an error was thrown in the base monad, so as per the usual interaction between effects in a monad transformer stack, those state changes get reverted. So we start from s1 instead.

Finally, the m implementation of generalBracket returns the pairs (b, s) and (c, s). For monad transformers other than StateT, this will be some other type representing the effects and values performed and returned by the use and release actions. The effect part of the use result, in this case _s2, usually needs to be discarded, since those effects have already been incorporated in the release action.

The only effect which is intentionally not incorporated in the release action is the effect of throwing an error. In that case, the error must be re-thrown. One subtlety which is easy to miss is that in the case in which use and release both throw an error, the error from release should take priority. Here is an implementation for ExceptT which demonstrates how to do this.

generalBracket acquire release use = ExceptT $ do
  (eb, ec) <- generalBracket
    (runExceptT acquire)
    (eresource exitCase -> case eresource of
      Left e -> return (Left e) -- nothing to release, acquire didn't succeed
      Right resource -> case exitCase of
        ExitCaseSuccess (Right b) -> runExceptT (release resource (ExitCaseSuccess b))
        ExitCaseException e       -> runExceptT (release resource (ExitCaseException e))
        _                         -> runExceptT (release resource ExitCaseAbort))
    (either (return . Left) (runExceptT . use))
  return $ do
    -- The order in which we perform those two Either effects determines
    -- which error will win if they are both Lefts. We want the error from
    -- release to win.
    c <- ec
    b <- eb
    return (b, c)

Since: exceptions-0.9.0

Instances

Instances details
MonadMask IO 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. IO a -> IO a) -> IO b) -> IO b #

uninterruptibleMask :: ((forall a. IO a -> IO a) -> IO b) -> IO b #

generalBracket :: IO a -> (a -> ExitCase b -> IO c) -> (a -> IO b) -> IO (b, c) #

e ~ SomeException => MonadMask (Either e)

Since: exceptions-0.8.3

Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. Either e a -> Either e a) -> Either e b) -> Either e b #

uninterruptibleMask :: ((forall a. Either e a -> Either e a) -> Either e b) -> Either e b #

generalBracket :: Either e a -> (a -> ExitCase b -> Either e c) -> (a -> Either e b) -> Either e (b, c) #

Monad m => MonadMask (CatchT m)

Note: This instance is only valid if the underlying monad has a single exit point!

For example, IO or Either would be invalid base monads, but Reader or State would be acceptable.

Instance details

Defined in Control.Monad.Catch.Pure

Methods

mask :: ((forall a. CatchT m a -> CatchT m a) -> CatchT m b) -> CatchT m b #

uninterruptibleMask :: ((forall a. CatchT m a -> CatchT m a) -> CatchT m b) -> CatchT m b #

generalBracket :: CatchT m a -> (a -> ExitCase b -> CatchT m c) -> (a -> CatchT m b) -> CatchT 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 (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 (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

mask :: ((forall a. ResourceT m a -> ResourceT m a) -> ResourceT m b) -> ResourceT m b #

uninterruptibleMask :: ((forall a. ResourceT m a -> ResourceT m a) -> ResourceT m b) -> ResourceT m b #

generalBracket :: ResourceT m a -> (a -> ExitCase b -> ResourceT m c) -> (a -> ResourceT m b) -> ResourceT m (b, c) #

MonadMask m => MonadMask (MaybeT m)

Since: exceptions-0.10.0

Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. MaybeT m a -> MaybeT m a) -> MaybeT m b) -> MaybeT m b #

uninterruptibleMask :: ((forall a. MaybeT m a -> MaybeT m a) -> MaybeT m b) -> MaybeT m b #

generalBracket :: MaybeT m a -> (a -> ExitCase b -> MaybeT m c) -> (a -> MaybeT m b) -> MaybeT m (b, c) #

(Error e, MonadMask m) => MonadMask (ErrorT e m) 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. ErrorT e m a -> ErrorT e m a) -> ErrorT e m b) -> ErrorT e m b #

uninterruptibleMask :: ((forall a. ErrorT e m a -> ErrorT e m a) -> ErrorT e m b) -> ErrorT e m b #

generalBracket :: ErrorT e m a -> (a -> ExitCase b -> ErrorT e m c) -> (a -> ErrorT e m b) -> ErrorT e m (b, c) #

MonadMask m => MonadMask (ExceptT e m)

Since: exceptions-0.9.0

Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. ExceptT e m a -> ExceptT e m a) -> ExceptT e m b) -> ExceptT e m b #

uninterruptibleMask :: ((forall a. ExceptT e m a -> ExceptT e m a) -> ExceptT e m b) -> ExceptT e m b #

generalBracket :: ExceptT e m a -> (a -> ExitCase b -> ExceptT e m c) -> (a -> ExceptT e m b) -> ExceptT e m (b, c) #

MonadMask m => MonadMask (IdentityT m) 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. IdentityT m a -> IdentityT m a) -> IdentityT m b) -> IdentityT m b #

uninterruptibleMask :: ((forall a. IdentityT m a -> IdentityT m a) -> IdentityT m b) -> IdentityT m b #

generalBracket :: IdentityT m a -> (a -> ExitCase b -> IdentityT m c) -> (a -> IdentityT m b) -> IdentityT m (b, c) #

MonadMask m => MonadMask (ReaderT r m) 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. ReaderT r m a -> ReaderT r m a) -> ReaderT r m b) -> ReaderT r m b #

uninterruptibleMask :: ((forall a. ReaderT r m a -> ReaderT r m a) -> ReaderT r m b) -> ReaderT r m b #

generalBracket :: ReaderT r m a -> (a -> ExitCase b -> ReaderT r m c) -> (a -> ReaderT r m b) -> ReaderT r m (b, c) #

MonadMask m => MonadMask (StateT s m) 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. StateT s m a -> StateT s m a) -> StateT s m b) -> StateT s m b #

uninterruptibleMask :: ((forall a. StateT s m a -> StateT s m a) -> StateT s m b) -> StateT s m b #

generalBracket :: StateT s m a -> (a -> ExitCase b -> StateT s m c) -> (a -> StateT s m b) -> StateT s m (b, c) #

MonadMask m => MonadMask (StateT s m) 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. StateT s m a -> StateT s m a) -> StateT s m b) -> StateT s m b #

uninterruptibleMask :: ((forall a. StateT s m a -> StateT s m a) -> StateT s m b) -> StateT s m b #

generalBracket :: StateT s m a -> (a -> ExitCase b -> StateT s m c) -> (a -> StateT s m b) -> StateT s m (b, c) #

(MonadMask m, Monoid w) => MonadMask (WriterT w m) 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. WriterT w m a -> WriterT w m a) -> WriterT w m b) -> WriterT w m b #

uninterruptibleMask :: ((forall a. WriterT w m a -> WriterT w m a) -> WriterT w m b) -> WriterT w m b #

generalBracket :: WriterT w m a -> (a -> ExitCase b -> WriterT w m c) -> (a -> WriterT w m b) -> WriterT w m (b, c) #

(MonadMask m, Monoid w) => MonadMask (WriterT w m) 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. WriterT w m a -> WriterT w m a) -> WriterT w m b) -> WriterT w m b #

uninterruptibleMask :: ((forall a. WriterT w m a -> WriterT w m a) -> WriterT w m b) -> WriterT w m b #

generalBracket :: WriterT w m a -> (a -> ExitCase b -> WriterT w m c) -> (a -> WriterT w m b) -> WriterT w m (b, c) #

(MonadMask m, Monoid w) => MonadMask (RWST r w s m) 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. RWST r w s m a -> RWST r w s m a) -> RWST r w s m b) -> RWST r w s m b #

uninterruptibleMask :: ((forall a. RWST r w s m a -> RWST r w s m a) -> RWST r w s m b) -> RWST r w s m b #

generalBracket :: RWST r w s m a -> (a -> ExitCase b -> RWST r w s m c) -> (a -> RWST r w s m b) -> RWST r w s m (b, c) #

(MonadMask m, Monoid w) => MonadMask (RWST r w s m) 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. RWST r w s m a -> RWST r w s m a) -> RWST r w s m b) -> RWST r w s m b #

uninterruptibleMask :: ((forall a. RWST r w s m a -> RWST r w s m a) -> RWST r w s m b) -> RWST r w s m b #

generalBracket :: RWST r w s m a -> (a -> ExitCase b -> RWST r w s m c) -> (a -> RWST r w s m b) -> RWST r w s m (b, c) #

eitherM :: Monad m => (a -> m c) -> (b -> m c) -> m (Either a b) -> m c #

Monadic generalisation of either.

maybeM :: Monad m => m b -> (a -> m b) -> m (Maybe a) -> m b #

Monadic generalisation of maybe.

fromEither :: Either a a -> a #

Pull the value out of an Either where both alternatives have the same type.

\x -> fromEither (Left x ) == x
\x -> fromEither (Right x) == x

notNull :: [a] -> Bool #

A composition of not and null.

notNull []  == False
notNull [1] == True
\xs -> notNull xs == not (null xs)

uncurry3 :: (a -> b -> c -> d) -> (a, b, c) -> d #

Converts a curried function to a function on a triple.

onException :: MonadMask m => m a -> m b -> m a #

Async safe version of onException

Since: safe-exceptions-0.1.0.0

jsonFormat :: LogItem a => ItemFormatter a #

Logs items as JSON. This can be useful in circumstances where you already have infrastructure that is expecting JSON to be logged to a standard stream or file. For example:

{"at":"2018-10-02T21:50:30.4523848Z","env":"production","ns":["MyApp"],"data":{},"app":["MyApp"],"msg":"Started","pid":"10456","loc":{"loc_col":9,"loc_pkg":"main","loc_mod":"Helpers.Logging","loc_fn":"Helpers\\Logging.hs","loc_ln":44},"host":"myhost.example.com","sev":"Info","thread":"ThreadId 139"}
{"at":"2018-10-02T21:50:30.4523848Z","env":"production","ns":["MyApp","confrabulation"],"data":{"confrab_factor":42},"app":["MyApp"],"msg":"Confrabulating widgets, with extra namespace and context","pid":"10456","loc":{"loc_col":11,"loc_pkg":"main","loc_mod":"Helpers.Logging","loc_fn":"Helpers\\Logging.hs","loc_ln":53},"host":"myhost.example.com","sev":"Debug","thread":"ThreadId 139"}
{"at":"2018-10-02T21:50:30.4523848Z","env":"production","ns":["MyApp"],"data":{},"app":["MyApp"],"msg":"Namespace and context are back to normal","pid":"10456","loc":{"loc_col":9,"loc_pkg":"main","loc_mod":"Helpers.Logging","loc_fn":"Helpers\\Logging.hs","loc_ln":55},"host":"myhost.example.com","sev":"Info","thread":"ThreadId 139"}

bracketFormat :: LogItem a => ItemFormatter a #

A traditional bracketed log format. Contexts and other information will be flattened out into bracketed fields. For example:

[2016-05-11 21:01:15][MyApp][Info][myhost.example.com][PID 1724][ThreadId 1154][main:Helpers.Logging Helpers/Logging.hs:32:7] Started
[2016-05-11 21:01:15][MyApp.confrabulation][Debug][myhost.example.com][PID 1724][ThreadId 1154][confrab_factor:42.0][main:Helpers.Logging Helpers/Logging.hs:41:9] Confrabulating widgets, with extra namespace and context
[2016-05-11 21:01:15][MyApp][Info][myhost.example.com][PID 1724][ThreadId 1154][main:Helpers.Logging Helpers/Logging.hs:43:7] Namespace and context are back to normal

mkHandleScribeWithFormatter :: (forall a. LogItem a => ItemFormatter a) -> ColorStrategy -> Handle -> PermitFunc -> Verbosity -> IO Scribe #

Logs to a file handle such as stdout, stderr, or a file. Takes a custom ItemFormatter that can be used to format Item as needed.

Returns the newly-created Scribe. The finalizer flushes the handle. Handle mode is set to LineBuffering automatically.

data ColorStrategy #

Constructors

ColorLog Bool

Whether to use color control chars in log output

ColorIfTerminal

Color if output is a terminal

Instances

Instances details
Show ColorStrategy 
Instance details

Defined in Katip.Scribes.Handle

Eq ColorStrategy 
Instance details

Defined in Katip.Scribes.Handle

katipAddContext :: (LogItem i, KatipContext m) => i -> m a -> m a #

Append some context to the current context for the given monadic action, then restore the previous state afterwards. Important note: be careful using this in a loop. If you're using something like forever or replicateM_ that does explicit sharing to avoid a memory leak, youll be fine as it will *sequence* calls to katipAddNamespace, so each loop will get the same context added. If you instead roll your own recursion and you're recursing in the action you provide, you'll instead accumulate tons of redundant contexts and even if they all merge on log, they are stored in a sequence and will leak memory. Works with anything implementing KatipContext.

runKatipContextT :: LogItem c => LogEnv -> c -> Namespace -> KatipContextT m a -> m a #

logTM :: ExpQ #

Loc-tagged logging when using template-haskell. Automatically supplies payload and namespace.

$(logTM) InfoS "Hello world"

data LogContexts #

Heterogeneous list of log contexts that provides a smart LogContext instance for combining multiple payload policies. This is critical for log contexts deep down in a stack to be able to inject their own context without worrying about other context that has already been set. Also note that contexts are treated as a sequence and <> will be appended to the right hand side of the sequence. If there are conflicting keys in the contexts, the /right side will take precedence/, which is counter to how monoid works for Map and HashMap, so bear that in mind. The reasoning is that if the user is sequentially adding contexts to the right side of the sequence, on conflict the intent is to overwrite with the newer value (i.e. the rightmost value).

Additional note: you should not mappend LogContexts in any sort of infinite loop, as it retains all data, so that would be a memory leak.

class Katip m => KatipContext (m :: Type -> Type) where #

A monadic context that has an inherant way to get logging context and namespace. Examples include a web application monad or database monad. The local variants are just like local from Reader and indeed you can easily implement them with local if you happen to be using a Reader in your monad. These give us katipAddNamespace and katipAddContext that works with *any* KatipContext, as opposed to making users have to implement these functions on their own in each app.

Methods

getKatipContext :: m LogContexts #

localKatipContext :: (LogContexts -> LogContexts) -> m a -> m a #

Temporarily modify the current context for the duration of the supplied monad. Used in katipAddContext

getKatipNamespace :: m Namespace #

localKatipNamespace :: (Namespace -> Namespace) -> m a -> m a #

Temporarily modify the current namespace for the duration of the supplied monad. Used in katipAddNamespace

Instances

Instances details
MonadIO m => KatipContext (AppM m) Source # 
Instance details

Defined in BtcLsp.Data.AppM

(Monad m, KatipContext m) => KatipContext (KatipT m) 
Instance details

Defined in Katip.Monadic

MonadIO m => KatipContext (KatipContextT m) 
Instance details

Defined in Katip.Monadic

MonadIO m => KatipContext (NoLoggingT m) 
Instance details

Defined in Katip.Monadic

(KatipContext m, Katip (ResourceT m)) => KatipContext (ResourceT m) 
Instance details

Defined in Katip.Monadic

(KatipContext m, Katip (MaybeT m)) => KatipContext (MaybeT 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 (IdentityT m)) => KatipContext (IdentityT 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 #

Provides a simple transformer that defines a KatipContext instance for a fixed namespace and context. Just like KatipT, you should use this if you prefer an explicit transformer stack and don't want to (or cannot) define KatipContext for your monad . This is the slightly more powerful version of KatipT in that it provides KatipContext instead of just Katip. For instance:

  threadWithLogging = do
    le <- getLogEnv
    ctx <- getKatipContext
    ns <- getKatipNamespace
    forkIO $ runKatipContextT le ctx ns $ do
      $(logTM) InfoS "Look, I can log in IO and retain context!"
      doOtherStuff

Instances

Instances details
MonadTransControl KatipContextT 
Instance details

Defined in Katip.Monadic

Associated Types

type StT KatipContextT a #

Methods

liftWith :: Monad m => (Run KatipContextT -> m a) -> KatipContextT m a #

restoreT :: Monad m => m (StT KatipContextT a) -> KatipContextT m a #

MonadTrans KatipContextT 
Instance details

Defined in Katip.Monadic

Methods

lift :: Monad m => 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 #

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 #

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 #

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 #

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 #

MonadBase b m => MonadBase b (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

liftBase :: b α -> KatipContextT m α #

MonadFail m => MonadFail (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

fail :: String -> KatipContextT m a #

MonadFix m => MonadFix (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

mfix :: (a -> KatipContextT m a) -> 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

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 #

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 #

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 #

MonadPlus m => MonadPlus (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 #

MonadIO m => Katip (KatipContextT m) 
Instance details

Defined in Katip.Monadic

MonadIO m => KatipContext (KatipContextT m) 
Instance details

Defined in Katip.Monadic

MonadResource m => MonadResource (KatipContextT m) 
Instance details

Defined in Katip.Monadic

MonadUnliftIO m => MonadUnliftIO (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

withRunInIO :: ((forall a. KatipContextT m a -> IO a) -> IO b) -> KatipContextT m b #

type StT KatipContextT a 
Instance details

Defined in Katip.Monadic

type StM (KatipContextT m) a 
Instance details

Defined in Katip.Monadic

formatAsLogTime :: UTCTime -> Text #

Format UTCTime into a short human readable format.

>>> formatAsLogTime $ UTCTime (fromGregorian 2016 1 23) 5025.123456789012
"2016-01-23 01:23:45"

closeScribes :: LogEnv -> IO LogEnv #

Call this at the end of your program. This is a blocking call that stop writing to a scribe's queue, waits for the queue to empty, finalizes each scribe in the log environment and then removes it. Finalizers are all run even if one of them throws, but the exception will be re-thrown at the end.

defaultScribeSettings :: ScribeSettings #

Reasonable defaults for a scribe. Buffer size of 4096.

class MonadIO m => Katip (m :: Type -> Type) where #

Monads where katip logging actions can be performed. Katip is the most basic logging monad. You will typically use this directly if you either don't want to use namespaces/contexts heavily or if you want to pass in specific contexts and/or namespaces at each log site.

For something more powerful, look at the docs for KatipContext, which keeps a namespace and merged context. You can write simple functions that add additional namespacing and merges additional context on the fly.

localLogEnv was added to allow for lexically-scoped modifications of the log env that are reverted when the supplied monad completes. katipNoLogging, for example, uses this to temporarily pause log outputs.

Methods

getLogEnv :: m LogEnv #

localLogEnv :: (LogEnv -> LogEnv) -> m a -> m a #

Instances

Instances details
MonadIO m => Katip (AppM m) Source # 
Instance details

Defined in BtcLsp.Data.AppM

Methods

getLogEnv :: AppM m LogEnv #

localLogEnv :: (LogEnv -> LogEnv) -> AppM m a -> AppM 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

MonadIO m => Katip (NoLoggingT m) 
Instance details

Defined in Katip.Monadic

Katip m => Katip (ResourceT m) 
Instance details

Defined in Katip.Core

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 #

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 #

registerScribe #

Arguments

:: Text

Name the scribe

-> Scribe 
-> ScribeSettings 
-> LogEnv 
-> IO LogEnv 

Add a scribe to the list. All future log calls will go to this scribe in addition to the others. Writes will be buffered per the ScribeSettings to prevent slow scribes from slowing down logging. Writes will be dropped if the buffer fills.

initLogEnv #

Arguments

:: Namespace

A base namespace for this application

-> Environment

Current run environment (e.g. prod vs. devel)

-> IO LogEnv 

Create a reasonable default InitLogEnv. Uses an AutoUpdate which updates the timer every 1ms. If you need even more timestamp precision at the cost of performance, consider setting _logEnvTimer with getCurrentTime.

permitItem :: Monad m => Severity -> Item a -> m Bool #

Should this item be logged given the user's maximum severity? Most new scribes will use this as a base for their PermitFunc

sl :: ToJSON a => Text -> a -> SimpleLogPayload #

Construct a simple log from any JSON item.

data LogEnv #

logStr :: StringConv a Text => a -> LogStr #

Pack any string-like thing into a LogStr. This will automatically work on String, ByteString, Text and any of the lazy variants.

data Namespace #

Represents a heirarchy of namespaces going from general to specific. For instance: ["processname", "subsystem"]. Note that single-segment namespaces can be created using IsString/OverloadedStrings, so "foo" will result in Namespace ["foo"].

Instances

Instances details
FromJSON Namespace 
Instance details

Defined in Katip.Core

ToJSON Namespace 
Instance details

Defined in Katip.Core

IsString Namespace 
Instance details

Defined in Katip.Core

Monoid Namespace 
Instance details

Defined in Katip.Core

Semigroup Namespace 
Instance details

Defined in Katip.Core

Generic Namespace 
Instance details

Defined in Katip.Core

Associated Types

type Rep Namespace :: Type -> Type #

Read Namespace 
Instance details

Defined in Katip.Core

Show Namespace 
Instance details

Defined in Katip.Core

Eq Namespace 
Instance details

Defined in Katip.Core

Ord Namespace 
Instance details

Defined in Katip.Core

Lift Namespace 
Instance details

Defined in Katip.Core

Methods

lift :: Quote m => Namespace -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Namespace -> Code m Namespace #

type Rep Namespace 
Instance details

Defined in Katip.Core

type Rep Namespace = D1 ('MetaData "Namespace" "Katip.Core" "katip-0.8.7.0-gDFsaslLHPFvpRds8z5ey" 'True) (C1 ('MetaCons "Namespace" 'PrefixI 'True) (S1 ('MetaSel ('Just "unNamespace") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Text])))

newtype Environment #

Application environment, like prod, devel, testing.

Constructors

Environment 

Fields

Instances

Instances details
FromJSON Environment 
Instance details

Defined in Katip.Core

ToJSON Environment 
Instance details

Defined in Katip.Core

IsString Environment 
Instance details

Defined in Katip.Core

Generic Environment 
Instance details

Defined in Katip.Core

Associated Types

type Rep Environment :: Type -> Type #

Read Environment 
Instance details

Defined in Katip.Core

Show Environment 
Instance details

Defined in Katip.Core

Eq Environment 
Instance details

Defined in Katip.Core

Ord Environment 
Instance details

Defined in Katip.Core

type Rep Environment 
Instance details

Defined in Katip.Core

type Rep Environment = D1 ('MetaData "Environment" "Katip.Core" "katip-0.8.7.0-gDFsaslLHPFvpRds8z5ey" 'True) (C1 ('MetaCons "Environment" 'PrefixI 'True) (S1 ('MetaSel ('Just "getEnvironment") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

data Severity #

Constructors

DebugS

Debug messages

InfoS

Information

NoticeS

Normal runtime Conditions

WarningS

General Warnings

ErrorS

General Errors

CriticalS

Severe situations

AlertS

Take immediate action

EmergencyS

System is unusable

Instances

Instances details
FromJSON Severity 
Instance details

Defined in Katip.Core

ToJSON Severity 
Instance details

Defined in Katip.Core

Bounded Severity 
Instance details

Defined in Katip.Core

Enum 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 #

Read Severity 
Instance details

Defined in Katip.Core

Show Severity 
Instance details

Defined in Katip.Core

Eq Severity 
Instance details

Defined in Katip.Core

Ord Severity 
Instance details

Defined in Katip.Core

Lift Severity 
Instance details

Defined in Katip.Core

Methods

lift :: Quote m => Severity -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Severity -> Code m Severity #

type Rep Severity 
Instance details

Defined in Katip.Core

type Rep Severity = D1 ('MetaData "Severity" "Katip.Core" "katip-0.8.7.0-gDFsaslLHPFvpRds8z5ey" '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 #

Verbosity controls the amount of information (columns) a Scribe emits during logging.

The convention is: - V0 implies no additional payload information is included in message. - V3 implies the maximum amount of payload information. - Anything in between is left to the discretion of the developer.

Constructors

V0 
V1 
V2 
V3 

Instances

Instances details
FromJSON Verbosity 
Instance details

Defined in Katip.Core

ToJSON Verbosity 
Instance details

Defined in Katip.Core

Bounded Verbosity 
Instance details

Defined in Katip.Core

Enum Verbosity 
Instance details

Defined in Katip.Core

Generic Verbosity 
Instance details

Defined in Katip.Core

Associated Types

type Rep Verbosity :: Type -> Type #

Read Verbosity 
Instance details

Defined in Katip.Core

Show Verbosity 
Instance details

Defined in Katip.Core

Eq Verbosity 
Instance details

Defined in Katip.Core

Ord Verbosity 
Instance details

Defined in Katip.Core

Lift Verbosity 
Instance details

Defined in Katip.Core

Methods

lift :: Quote m => Verbosity -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Verbosity -> Code m Verbosity #

type Rep Verbosity 
Instance details

Defined in Katip.Core

type Rep Verbosity = D1 ('MetaData "Verbosity" "Katip.Core" "katip-0.8.7.0-gDFsaslLHPFvpRds8z5ey" '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)))

newtype LogStr #

Log message with Builder underneath; use <> to concat in O(1).

Constructors

LogStr 

Fields

Instances

Instances details
FromJSON LogStr 
Instance details

Defined in Katip.Core

IsString LogStr 
Instance details

Defined in Katip.Core

Methods

fromString :: String -> LogStr #

Monoid LogStr 
Instance details

Defined in Katip.Core

Semigroup LogStr 
Instance details

Defined in Katip.Core

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 #

Show LogStr 
Instance details

Defined in Katip.Core

Eq LogStr 
Instance details

Defined in Katip.Core

Methods

(==) :: LogStr -> LogStr -> Bool #

(/=) :: LogStr -> LogStr -> Bool #

type Rep LogStr 
Instance details

Defined in Katip.Core

type Rep LogStr = D1 ('MetaData "LogStr" "Katip.Core" "katip-0.8.7.0-gDFsaslLHPFvpRds8z5ey" 'True) (C1 ('MetaCons "LogStr" 'PrefixI 'True) (S1 ('MetaSel ('Just "unLogStr") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Builder)))

(^?) :: s -> Getting (First a) s a -> Maybe a infixl 8 #

s ^? t returns the 1st element t returns, or Nothing if t doesn't return anything. It's trivially implemented by passing the First monoid to the getter.

Safe head:

>>> [] ^? each
Nothing
>>> [1..3] ^? each
Just 1

Converting Either to Maybe:

>>> Left 1 ^? _Right
Nothing
>>> Right 1 ^? _Right
Just 1

A non-operator version of (^?) is called preview, and – like view – it's a bit more general than (^?) (it works in MonadReader). If you need the general version, you can get it from microlens-mtl; otherwise there's preview available in Lens.Micro.Extras.

(^..) :: s -> Getting (Endo [a]) s a -> [a] infixl 8 #

s ^.. t returns the list of all values that t gets from s.

A Maybe contains either 0 or 1 values:

>>> Just 3 ^.. _Just
[3]

Gathering all values in a list of tuples:

>>> [(1,2),(3,4)] ^.. each.each
[1,2,3,4]

(^.) :: s -> Getting a s a -> a infixl 8 #

(^.) applies a getter to a value; in other words, it gets a value out of a structure using a getter (which can be a lens, traversal, fold, etc.).

Getting 1st field of a tuple:

(^. _1) :: (a, b) -> a
(^. _1) = fst

When (^.) is used with a traversal, it combines all results using the Monoid instance for the resulting type. For instance, for lists it would be simple concatenation:

>>> ("str","ing") ^. each
"string"

The reason for this is that traversals use Applicative, and the Applicative instance for Const uses monoid concatenation to combine “effects” of Const.

A non-operator version of (^.) is called view, and it's a bit more general than (^.) (it works in MonadReader). If you need the general version, you can get it from microlens-mtl; otherwise there's view available in Lens.Micro.Extras.

(.~) :: ASetter s t a b -> b -> s -> t infixr 4 #

(.~) assigns a value to the target. It's the same thing as using (%~) with const:

l .~ x = l %~ const x

See set if you want a non-operator synonym.

Here it is used to change 2 fields of a 3-tuple:

>>> (0,0,0) & _1 .~ 1 & _3 .~ 3
(1,0,3)

over :: ASetter s t a b -> (a -> b) -> s -> t #

over is a synonym for (%~).

Getting fmap in a roundabout way:

over mapped :: Functor f => (a -> b) -> f a -> f b
over mapped = fmap

Applying a function to both components of a pair:

over both :: (a -> b) -> (a, a) -> (b, b)
over both = \f t -> (f (fst t), f (snd t))

Using over _2 as a replacement for second:

>>> over _2 show (10,20)
(10,"20")

(%~) :: ASetter s t a b -> (a -> b) -> s -> t infixr 4 #

(%~) applies a function to the target; an alternative explanation is that it is an inverse of sets, which turns a setter into an ordinary function. mapped %~ reverse is the same thing as fmap reverse.

See over if you want a non-operator synonym.

Negating the 1st element of a pair:

>>> (1,2) & _1 %~ negate
(-1,2)

Turning all Lefts in a list to upper case:

>>> (mapped._Left.mapped %~ toUpper) [Left "foo", Right "bar"]
[Left "FOO",Right "bar"]

_1 :: Field1 s t a b => Lens s t a b #

Gives access to the 1st field of a tuple (up to 5-tuples).

Getting the 1st component:

>>> (1,2,3,4,5) ^. _1
1

Setting the 1st component:

>>> (1,2,3) & _1 .~ 10
(10,2,3)

Note that this lens is lazy, and can set fields even of undefined:

>>> set _1 10 undefined :: (Int, Int)
(10,*** Exception: Prelude.undefined

This is done to avoid violating a lens law stating that you can get back what you put:

>>> view _1 . set _1 10 $ (undefined :: (Int, Int))
10

The implementation (for 2-tuples) is:

_1 f t = (,) <$> f    (fst t)
             <*> pure (snd t)

or, alternatively,

_1 f ~(a,b) = (\a' -> (a',b)) <$> f a

(where ~ means a lazy pattern).

_2, _3, _4, and _5 are also available (see below).

_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 #

Lens s t a b is the lowest common denominator of a setter and a getter, something that has the power of both; it has a Functor constraint, and since both Const and Identity are functors, it can be used whenever a getter or a setter is needed.

  • a is the type of the value inside of structure
  • b is the type of the replaced value
  • s is the type of the whole structure
  • t is the type of the structure after replacing a in it with b

type Lens' s a = Lens s s a a #

This is a type alias for monomorphic lenses which don't change the type of the container (or of the value inside).

type Traversal s t a b = forall (f :: Type -> Type). Applicative f => (a -> f b) -> s -> f t #

Traversal s t a b is a generalisation of Lens which allows many targets (possibly 0). It's achieved by changing the constraint to Applicative instead of Functor – indeed, the point of Applicative is that you can combine effects, which is just what we need to have many targets.

Ultimately, traversals should follow 2 laws:

t pure ≡ pure
fmap (t f) . t g ≡ getCompose . t (Compose . fmap f . g)

The 1st law states that you can't change the shape of the structure or do anything funny with elements (traverse elements which aren't in the structure, create new elements out of thin air, etc.). The 2nd law states that you should be able to fuse 2 identical traversals into one. For a more detailed explanation of the laws, see this blog post (if you prefer rambling blog posts), or The Essence Of The Iterator Pattern (if you prefer papers).

Traversing any value twice is a violation of traversal laws. You can, however, traverse values in any order.

type Traversal' s a = Traversal s s a a #

This is a type alias for monomorphic traversals which don't change the type of the container (or of the values inside).

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.

gets :: MonadState s m => (s -> a) -> m a #

Gets specific component of the state, using a projection function supplied.

preuse :: MonadState s m => Getting (First a) s a -> m (Maybe a) #

preuse is (^?) (or preview) which implicitly operates on the state – it takes the state and applies a traversal (or fold) to it to extract the 1st element the traversal points at.

preuse l = gets (preview l)

use :: MonadState s m => Getting a s a -> m a #

use is (^.) (or view) which implicitly operates on the state; for instance, if your state is a record containing a field foo, you can write

x <- use foo

to extract foo from the state. In other words, use is the same as gets, but for getters instead of functions.

The implementation of use is straightforward:

use l = gets (view l)

If you need to extract something with a fold or traversal, you need preuse.

preview :: MonadReader s m => Getting (First a) s a -> m (Maybe a) #

preview is a synonym for (^?), generalised for MonadReader (just like view, which is a synonym for (^.)).

>>> preview each [1..5]
Just 1

view :: MonadReader s m => Getting a s a -> m a #

view is a synonym for (^.), generalised for MonadReader (we are able to use it instead of (^.) since functions are instances of the MonadReader class):

>>> view _1 (1, 2)
1

When you're using Reader for config and your config type has lenses generated for it, most of the time you'll be using view instead of asks:

doSomething :: (MonadReader Config m) => m Int
doSomething = do
  thingy        <- view setting1  -- same as “asks (^. setting1)”
  anotherThingy <- view setting2
  ...

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

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.)

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.

type HostName = String #

Either a host name e.g., "haskell.org" or a numeric host address string consisting of a dotted decimal IPv4 address or an IPv6 address e.g., "192.168.0.1".

data PortNumber #

Port number. Use the Num instance (i.e. use a literal) to create a PortNumber value.

>>> 1 :: PortNumber
1
>>> read "1" :: PortNumber
1
>>> show (12345 :: PortNumber)
"12345"
>>> 50000 < (51000 :: PortNumber)
True
>>> 50000 < (52000 :: PortNumber)
True
>>> 50000 + (10000 :: PortNumber)
60000

Instances

Instances details
Out PortNumber Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Storable PortNumber 
Instance details

Defined in Network.Socket.Types

Bounded PortNumber 
Instance details

Defined in Network.Socket.Types

Enum PortNumber 
Instance details

Defined in Network.Socket.Types

Num PortNumber 
Instance details

Defined in Network.Socket.Types

Read PortNumber 
Instance details

Defined in Network.Socket.Types

Integral PortNumber 
Instance details

Defined in Network.Socket.Types

Real PortNumber 
Instance details

Defined in Network.Socket.Types

Show PortNumber 
Instance details

Defined in Network.Socket.Types

Eq PortNumber 
Instance details

Defined in Network.Socket.Types

Ord PortNumber 
Instance details

Defined in Network.Socket.Types

From PortNumber Word32 Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

Methods

from :: PortNumber -> Word32

From PortNumber LnPort Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

Methods

from :: PortNumber -> LnPort

data Pool a #

Instances

Instances details
Show (Pool a) 
Instance details

Defined in Data.Pool

Methods

showsPrec :: Int -> Pool a -> ShowS #

show :: Pool a -> String #

showList :: [Pool a] -> ShowS #

destroyAllResources :: Pool a -> IO () #

Destroy all resources in all stripes in the pool. Note that this will ignore any exceptions in the destroy function.

This function is useful when you detect that all resources in the pool are broken. For example after a database has been restarted all connections opened before the restart will be broken. In that case it's better to close those connections so that takeResource won't take a broken connection from the pool but will open a new connection instead.

Another use-case for this function is that when you know you are done with the pool you can destroy all idle resources immediately instead of waiting on the garbage collector to destroy them, thus freeing up those resources sooner.

bracketOnError :: MonadMask m => m a -> (a -> m b) -> (a -> m c) -> m c #

Async safe version of bracketOnError

Since: safe-exceptions-0.1.0.0

bracket_ :: MonadMask m => m a -> m b -> m c -> m c #

Async safe version of bracket_

Since: safe-exceptions-0.1.0.0

tryAny :: MonadCatch m => m a -> m (Either SomeException a) #

try specialized to catch all synchronous exceptions

Since: safe-exceptions-0.1.0.0

try :: (MonadCatch m, Exception e) => m a -> m (Either e a) #

Same as upstream try, but will not catch asynchronous exceptions

Since: safe-exceptions-0.1.0.0

handleAny :: MonadCatch m => (SomeException -> m a) -> m a -> m a #

Flipped version of catchAny

Since: safe-exceptions-0.1.0.0

catchAny :: MonadCatch m => m a -> (SomeException -> m a) -> m a #

catch specialized to catch all synchronous exception

Since: safe-exceptions-0.1.0.0

catch :: (MonadCatch m, Exception e) => m a -> (e -> m a) -> m a #

Same as upstream catch, but will not catch asynchronous exceptions

Since: safe-exceptions-0.1.0.0

throwM :: (MonadThrow m, Exception e) => e -> m a #

Synonym for throw

Since: safe-exceptions-0.1.0.0

newBroadcastTChanIO :: IO (TChan a) #

IO version of newBroadcastTChan.

Since: stm-2.4

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.

pack :: String -> Text #

O(n) Convert a String into a Text. Subject to fusion. Performs replacement on invalid scalar values.

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.

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.

diffUTCTime :: UTCTime -> UTCTime -> NominalDiffTime #

diffUTCTime a b = a - b

addUTCTime :: NominalDiffTime -> UTCTime -> UTCTime #

addUTCTime a b = a + b

diffTimeToPicoseconds :: DiffTime -> Integer #

Get the number of picoseconds in a DiffTime.

secondsToDiffTime :: Integer -> DiffTime #

Create a DiffTime which represents an integral number of seconds.

exceptToMaybeT :: forall (m :: Type -> Type) e a. Functor m => ExceptT e m a -> MaybeT m a #

Convert a ExceptT computation to MaybeT, discarding the value of any exception.

maybeToExceptT :: forall (m :: Type -> Type) e a. Functor m => e -> MaybeT m a -> ExceptT e m a #

Convert a MaybeT computation to ExceptT, with a default exception value.

except :: forall (m :: Type -> Type) e a. Monad m => Either e a -> ExceptT e m a #

Constructor for computations in the exception monad. (The inverse of runExcept).

delay :: Integer -> IO () #

Like Control.Concurrent.threadDelay, but not bounded by an Int.

Suspends the current thread for a given number of microseconds (GHC only).

There is no guarantee that the thread will be rescheduled promptly when the delay has expired, but the thread will never continue to run earlier than specified.

class SuperComposition a b c | a b -> c where #

This type class allows to implement variadic composition operator.

Methods

(...) :: a -> b -> c infixl 8 #

Allows to apply function to result of another function with multiple arguments.

>>> (show ... (+)) 1 2
"3"
>>> show ... 5
"5"
>>> (null ... zip5) [1] [2] [3] [] [5]
True

Inspired by http://stackoverflow.com/questions/9656797/variadic-compose-function.

Performance

To check the performance there was done a bunch of benchmarks. Benchmarks were made on examples given above and also on the functions of many arguments. The results are showing that the operator (...) performs as fast as plain applications of the operator (.) on almost all the tests, but (...) leads to the performance draw-down if ghc fails to inline it. Slow behavior was noticed on functions without type specifications. That's why keep in mind that providing explicit type declarations for functions is very important when using (...). Relying on type inference will lead to the situation when all optimizations disappear due to very general inferred type. However, functions without type specification but with applied INLINE pragma are fast again.

Instances

Instances details
(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 #

type ($) (f :: k1 -> k) (a :: k1) = f a infixr 2 #

Infix application.

f :: Either String $ Maybe Int
=
f :: Either String (Maybe Int)

type family Each (c :: [k -> Constraint]) (as :: [k]) where ... #

Map several constraints over several variables.

f :: Each [Show, Read] [a, b] => a -> b -> String
=
f :: (Show a, Show b, Read a, Read b) => a -> b -> String

To specify list with single constraint / variable, don't forget to prefix it with ':

f :: Each '[Show] [a, b] => a -> b -> String

Equations

Each (_1 :: [k -> Constraint]) ('[] :: [k]) = () 
Each (c :: [k -> Constraint]) (h ': t :: [k]) = (c <+> h, Each c t) 

type With (a :: [k -> Constraint]) (b :: k) = a <+> b #

Map several constraints over a single variable. Note, that With a b ≡ Each a '[b]

a :: With [Show, Read] a => a -> a
=
a :: (Show a, Read a) => a -> a

readEither :: (ToString a, Read b) => a -> Either Text b #

Polymorhpic version of readEither.

>>> readEither @Text @Int "123"
Right 123
>>> readEither @Text @Int "aa"
Left "Prelude.read: no parse"

type LText = Text #

Type synonym for Text.

type LByteString = ByteString #

Type synonym for ByteString.

class ConvertUtf8 a b where #

Type class for conversion to utf8 representation of text.

Methods

encodeUtf8 :: a -> b #

Encode as utf8 string (usually ByteString).

>>> encodeUtf8 @Text @ByteString "патак"
"\208\191\208\176\209\130\208\176\208\186"

decodeUtf8 :: b -> a #

Decode from utf8 string.

>>> decodeUtf8 @Text @ByteString "\208\191\208\176\209\130\208\176\208\186"
"\1087\1072\1090\1072\1082"
>>> putStrLn $ decodeUtf8 @Text @ByteString "\208\191\208\176\209\130\208\176\208\186"
патак

decodeUtf8Strict :: b -> Either UnicodeException a #

Decode as utf8 string but returning execption if byte sequence is malformed.

>>> decodeUtf8 @Text @ByteString "\208\208\176\209\130\208\176\208\186"
"\65533\1072\1090\1072\1082"
>>> decodeUtf8Strict @Text @ByteString "\208\208\176\209\130\208\176\208\186"
Left Cannot decode byte '\xd0': Data.Text.Internal.Encoding.decodeUtf8: Invalid UTF-8 stream

class ToText a where #

Type class for converting other strings to Text.

Methods

toText :: a -> Text #

Instances

Instances details
ToText Text 
Instance details

Defined in Universum.String.Conversion

Methods

toText :: Text -> Text #

ToText Text 
Instance details

Defined in Universum.String.Conversion

Methods

toText :: Text -> Text0 #

ToText String 
Instance details

Defined in Universum.String.Conversion

Methods

toText :: String -> Text #

class ToLText a where #

Type class for converting other strings to Text.

Methods

toLText :: a -> Text #

Instances

Instances details
ToLText Text 
Instance details

Defined in Universum.String.Conversion

Methods

toLText :: Text -> Text0 #

ToLText Text 
Instance details

Defined in Universum.String.Conversion

Methods

toLText :: Text -> Text #

ToLText String 
Instance details

Defined in Universum.String.Conversion

Methods

toLText :: String -> Text #

class ToString a where #

Type class for converting other strings to String.

Methods

toString :: a -> String #

Instances

Instances details
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 #

ToString String 
Instance details

Defined in Universum.String.Conversion

Methods

toString :: String -> String #

undefined :: forall (r :: RuntimeRep) (a :: TYPE r). HasCallStack => a #

undefined that leaves a warning in code on every usage.

traceId :: Text -> Text #

Version of traceId that leaves a warning.

traceM :: Monad m => Text -> m () #

Version of traceM that leaves a warning and takes Text.

traceShowM :: (Show a, Monad m) => a -> m () #

Version of traceShowM that leaves a warning.

traceShowIdWith :: Show s => (a -> s) -> a -> a #

Version of traceShowId that leaves a warning. Useful to tag printed data, for instance:

traceShowIdWith ("My data: ", ) (veryLargeExpression)

traceIdWith :: (a -> Text) -> a -> a #

Version of traceId that leaves a warning. Useful to tag printed data, for instance:

traceIdWith (x -> "My data: " <> show x) (veryLargeExpression)

This is especially useful with custom formatters:

traceIdWith (x -> "My data: " <> pretty x) (veryLargeExpression)

traceShowId :: Show a => a -> a #

Version of traceShowId that leaves a warning.

traceShow :: Show a => a -> b -> b #

Version of traceShow that leaves a warning.

error :: forall (r :: RuntimeRep) (a :: TYPE r). HasCallStack => Text -> a #

error that takes Text as an argument.

trace :: Text -> a -> a #

Version of trace that leaves a warning and takes Text.

data Undefined #

Similar to undefined but data type.

Constructors

Undefined 

Instances

Instances details
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 :: forall r r'. (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 #

Bounded Undefined 
Instance details

Defined in Universum.Debug

Enum Undefined 
Instance details

Defined in Universum.Debug

Generic Undefined 
Instance details

Defined in Universum.Debug

Associated Types

type Rep Undefined :: Type -> Type #

Read Undefined 
Instance details

Defined in Universum.Debug

Show Undefined 
Instance details

Defined in Universum.Debug

Eq Undefined 
Instance details

Defined in Universum.Debug

Ord Undefined 
Instance details

Defined in Universum.Debug

type Rep Undefined 
Instance details

Defined in Universum.Debug

type Rep Undefined = D1 ('MetaData "Undefined" "Universum.Debug" "universum-1.7.3-LQIqLRIyXQx1cvPWtz8ICX" 'False) (C1 ('MetaCons "Undefined" 'PrefixI 'False) (U1 :: Type -> Type))

putLTextLn :: MonadIO m => Text -> m () #

Specialized to Text version of putStrLn or forcing type inference.

putLText :: MonadIO m => Text -> m () #

Specialized to Text version of putStr or forcing type inference.

putTextLn :: MonadIO m => Text -> m () #

Specialized to Text version of putStrLn or forcing type inference.

putText :: MonadIO m => Text -> m () #

Specialized to Text version of putStr or forcing type inference.

hPrint :: (MonadIO m, Show a) => Handle -> a -> m () #

Lifted version of hPrint

putStrLn :: (Print a, MonadIO m) => a -> m () #

Write a string like value to stdout appending a newline character.

putStr :: (Print a, MonadIO m) => a -> m () #

Write a string like value to stdout/.

hPutStrLn :: (Print a, MonadIO m) => Handle -> a -> m () #

Write a string like value a to a supplied Handle, appending a newline character.

hPutStr :: (Print a, MonadIO m) => Handle -> a -> m () #

Write a string like value a to a supplied Handle.

class Print a #

Support class to overload writing of string like values.

Minimal complete definition

hPutStr, hPutStrLn

Instances

Instances details
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 () #

unstableNub :: (Eq a, Hashable a) => [a] -> [a] #

Like hashNub but has better performance and also doesn't save the order.

>>> unstableNub [3, 3, 3, 2, 2, -1, 1]
[1,2,3,-1]

sortNub :: Ord a => [a] -> [a] #

Like ordNub but also sorts a list.

>>> sortNub [3, 3, 3, 2, 2, -1, 1]
[-1,1,2,3]

hashNub :: (Eq a, Hashable a) => [a] -> [a] #

Like nub but runs in O(n * log_16(n)) time and requires Hashable.

>>> hashNub [3, 3, 3, 2, 2, -1, 1]
[3,2,-1,1]

ordNub :: Ord a => [a] -> [a] #

Like nub but runs in O(n * log n) time and requires Ord.

>>> ordNub [3, 3, 3, 2, 2, -1, 1]
[3,2,-1,1]

guardM :: MonadPlus m => m Bool -> m () #

Monadic version of guard. Occasionally useful. Here some complex but real-life example:

findSomePath :: IO (Maybe FilePath)

somePath :: MaybeT IO FilePath
somePath = do
    path <- MaybeT findSomePath
    guardM $ liftIO $ doesDirectoryExist path
    return path

ifM :: Monad m => m Bool -> m a -> m a -> m a #

Monadic version of if-then-else.

>>> ifM (pure True) (putTextLn "True text") (putTextLn "False text")
True text

unlessM :: Monad m => m Bool -> m () -> m () #

Monadic version of unless.

>>> unlessM (pure False) $ putTextLn "No text :("
No text :(
>>> unlessM (pure True) $ putTextLn "Yes text :)"

whenM :: Monad m => m Bool -> m () -> m () #

Monadic version of when.

>>> whenM (pure False) $ putTextLn "No text :("
>>> whenM (pure True)  $ putTextLn "Yes text :)"
Yes text :)
>>> whenM (Just True) (pure ())
Just ()
>>> whenM (Just False) (pure ())
Just ()
>>> whenM Nothing (pure ())
Nothing

evaluateNF_ :: (NFData a, MonadIO m) => a -> m () #

Alias for evaluateWHNF . rnf. Similar to evaluateNF but discards resulting value.

evaluateNF :: (NFData a, MonadIO m) => a -> m a #

Alias for evaluateWHNF . force with clearer name.

evaluateWHNF_ :: MonadIO m => a -> m () #

Like evaluateWNHF but discards value.

evaluateWHNF :: MonadIO m => a -> m a #

Lifted alias for evaluate with clearer name.

note :: MonadError e m => e -> Maybe a -> m a #

Throws error for Maybe if Nothing is given. Operates over MonadError.

bug :: (HasCallStack, Exception e) => e -> a #

Generate a pure value which, when forced, will synchronously throw the exception wrapped into Bug data type.

pattern Exc :: Exception e => e -> SomeException #

Pattern synonym to easy pattern matching on exceptions. So intead of writing something like this:

isNonCriticalExc e
    | Just (_ :: NodeAttackedError) <- fromException e = True
    | Just DialogUnexpected{} <- fromException e = True
    | otherwise = False

you can use Exc pattern synonym:

isNonCriticalExc = case
    Exc (_ :: NodeAttackedError) -> True  -- matching all exceptions of type NodeAttackedError
    Exc DialogUnexpected{} -> True
    _ -> False

This pattern is bidirectional. You can use Exc e instead of toException e.

data Bug #

Type that represents exceptions used in cases when a particular codepath is not meant to be ever executed, but happens to be executed anyway.

Instances

Instances details
Exception Bug 
Instance details

Defined in Universum.Exception

Show Bug 
Instance details

Defined in Universum.Exception

Methods

showsPrec :: Int -> Bug -> ShowS #

show :: Bug -> String #

showList :: [Bug] -> ShowS #

maximum :: Ord a => NonEmpty a -> a #

The largest element of a NonEmpty.

>>> maximum (1 :| [2,3,4,5])
5

maximumBy :: (a -> a -> Ordering) -> NonEmpty a -> a #

The largest element of a NonEmpty with respect to the given comparison function.

minimum :: Ord a => NonEmpty a -> a #

The least element of a NonEmpty.

>>> minimum (1 :| [2,3,4,5])
1

minimumBy :: (a -> a -> Ordering) -> NonEmpty a -> a #

The least element of a NonEmpty with respect to the given comparison function.

foldr1 :: (a -> a -> a) -> NonEmpty a -> a #

A variant of foldr that has no base case, and thus may only be applied to NonEmpty.

>>> foldr1 (+) (1 :| [2,3,4,5])
15

foldl1 :: (a -> a -> a) -> NonEmpty a -> a #

A variant of foldl that has no base case, and thus may only be applied to NonEmpty.

>>> foldl1 (+) (1 :| [2,3,4,5])
15

whenNotNullM :: Monad m => m [a] -> (NonEmpty a -> m ()) -> m () #

Monadic version of whenNotNull.

whenNotNull :: Applicative f => [a] -> (NonEmpty a -> f ()) -> f () #

Performs given action over NonEmpty list if given list is non empty.

>>> whenNotNull [] $ \(b :| _) -> print (not b)
>>> whenNotNull [False,True] $ \(b :| _) -> print (not b)
True

uncons :: [a] -> Maybe (a, [a]) #

Destructuring list into its head and tail if possible. This function is total.

>>> uncons []
Nothing
>>> uncons [1..5]
Just (1,[2,3,4,5])
>>> uncons (5 : [1..5]) >>= \(f, l) -> pure $ f == length l
Just True

anyM :: (Container f, Monad m) => (Element f -> m Bool) -> f -> m Bool #

Monadic and constrained to Container version of any.

>>> anyM (readMaybe >=> pure . even) ["5", "10"]
Just True
>>> anyM (readMaybe >=> pure . even) ["10", "aba"]
Just True
>>> anyM (readMaybe >=> pure . even) ["aba", "10"]
Nothing

allM :: (Container f, Monad m) => (Element f -> m Bool) -> f -> m Bool #

Monadic and constrained to Container version of all.

>>> allM (readMaybe >=> pure . even) ["6", "10"]
Just True
>>> allM (readMaybe >=> pure . even) ["5", "aba"]
Just False
>>> allM (readMaybe >=> pure . even) ["aba", "10"]
Nothing

orM :: (Container f, Element f ~ m Bool, Monad m) => f -> m Bool #

Monadic and constrained to Container version of or.

>>> orM [Just True, Just False]
Just True
>>> orM [Just True, Nothing]
Just True
>>> orM [Nothing, Just True]
Nothing

andM :: (Container f, Element f ~ m Bool, Monad m) => f -> m Bool #

Monadic and constrained to Container version of and.

>>> andM [Just True, Just False]
Just False
>>> andM [Just True]
Just True
>>> andM [Just True, Just False, Nothing]
Just False
>>> andM [Just True, Nothing]
Nothing
>>> andM [putTextLn "1" >> pure True, putTextLn "2" >> pure False, putTextLn "3" >> pure True]
1
2
False

concatForM :: (Applicative f, Monoid m, Container (l m), Element (l m) ~ m, Traversable l) => l a -> (a -> f m) -> f m #

Like concatMapM, but has its arguments flipped, so can be used instead of the common fmap concat $ forM pattern.

concatMapM :: (Applicative f, Monoid m, Container (l m), Element (l m) ~ m, Traversable l) => (a -> f m) -> l a -> f m #

Lifting bind into a monad. Generalized version of concatMap that works with a monadic predicate. Old and simpler specialized to list version had next type:

concatMapM :: Monad m => (a -> m [b]) -> [a] -> m [b]

Side note: previously it had type

concatMapM :: (Applicative q, Monad m, Traversable m)
           => (a -> q (m b)) -> m a -> q (m b)

Such signature didn't allow to use this function when traversed container type and type of returned by function-argument differed. Now you can use it like e.g.

concatMapM readFile files >>= putTextLn

asum :: (Container t, Alternative f, Element t ~ f a) => t -> f a #

Constrained to Container version of asum.

>>> asum [Nothing, Just [False, True], Nothing, Just [True]]
Just [False,True]

sequence_ :: (Container t, Monad m, Element t ~ m a) => t -> m () #

Constrained to Container version of sequence_.

>>> sequence_ [putTextLn "foo", print True]
foo
True

sequenceA_ :: (Container t, Applicative f, Element t ~ f a) => t -> f () #

Constrained to Container version of sequenceA_.

>>> sequenceA_ [putTextLn "foo", print True]
foo
True

forM_ :: (Container t, Monad m) => t -> (Element t -> m b) -> m () #

Constrained to Container version of forM_.

>>> forM_ [True, False] print
True
False

mapM_ :: (Container t, Monad m) => (Element t -> m b) -> t -> m () #

Constrained to Container version of mapM_.

>>> mapM_ print [True, False]
True
False

for_ :: (Container t, Applicative f) => t -> (Element t -> f b) -> f () #

Constrained to Container version of for_.

>>> for_ [1 .. 5 :: Int] $ \i -> when (even i) (print i)
2
4

traverse_ :: (Container t, Applicative f) => (Element t -> f b) -> t -> f () #

Constrained to Container version of traverse_.

>>> traverse_ putTextLn ["foo", "bar"]
foo
bar

product :: (Container t, Num (Element t)) => t -> Element t #

Stricter version of product.

>>> product [1..10]
3628800
>>> product (Right 3)
...
    • Do not use 'Foldable' methods on Either
      Suggestions:
          Instead of
              for_ :: (Foldable t, Applicative f) => t a -> (a -> f b) -> f ()
          use
              whenJust  :: Applicative f => Maybe a    -> (a -> f ()) -> f ()
              whenRight :: Applicative f => Either l r -> (r -> f ()) -> f ()
...
          Instead of
              fold :: (Foldable t, Monoid m) => t m -> m
          use
              maybeToMonoid :: Monoid m => Maybe m -> m
...

sum :: (Container t, Num (Element t)) => t -> Element t #

Stricter version of sum.

>>> sum [1..10]
55
>>> sum (Just 3)
...
    • Do not use 'Foldable' methods on Maybe
      Suggestions:
          Instead of
              for_ :: (Foldable t, Applicative f) => t a -> (a -> f b) -> f ()
          use
              whenJust  :: Applicative f => Maybe a    -> (a -> f ()) -> f ()
              whenRight :: Applicative f => Either l r -> (r -> f ()) -> f ()
...
          Instead of
              fold :: (Foldable t, Monoid m) => t m -> m
          use
              maybeToMonoid :: Monoid m => Maybe m -> m
...

flipfoldl' :: (Container t, Element t ~ a) => (a -> b -> b) -> b -> t -> b #

Similar to foldl' but takes a function with its arguments flipped.

>>> flipfoldl' (/) 5 [2,3] :: Rational
15 % 2

type family Val t #

Type of value of the mapping.

Instances

Instances details
type Val (NonEmpty (k, v)) 
Instance details

Defined in Universum.Container.Class

type Val (NonEmpty (k, v)) = v
type Val (IntMap v) 
Instance details

Defined in Universum.Container.Class

type Val (IntMap v) = v
type Val [(k, v)] 
Instance details

Defined in Universum.Container.Class

type Val [(k, v)] = v
type Val (Map k v) 
Instance details

Defined in Universum.Container.Class

type Val (Map k v) = v
type Val (HashMap k v) 
Instance details

Defined in Universum.Container.Class

type Val (HashMap k v) = v

type family Key t #

Type of keys of the mapping.

Instances

Instances details
type Key (NonEmpty (k, v)) 
Instance details

Defined in Universum.Container.Class

type Key (NonEmpty (k, v)) = k
type Key (IntMap v) 
Instance details

Defined in Universum.Container.Class

type Key (IntMap v) = Int
type Key [(k, v)] 
Instance details

Defined in Universum.Container.Class

type Key [(k, v)] = k
type Key (Map k v) 
Instance details

Defined in Universum.Container.Class

type Key (Map k v) = k
type Key (HashMap k v) 
Instance details

Defined in Universum.Container.Class

type Key (HashMap k v) = k

class ToPairs t where #

Type class for data types that can be converted to List of Pairs. You can define ToPairs by just defining toPairs function.

But the following laws should be met:

toPairs m ≡ zip (keys m) (elems m)
keysmap fst . toPairs
elemsmap snd . toPairs

Minimal complete definition

toPairs

Associated Types

type Key t #

Type of keys of the mapping.

type Val t #

Type of value of the mapping.

Methods

toPairs :: t -> [(Key t, Val t)] #

Converts the structure to the list of the key-value pairs. >>> toPairs (HashMap.fromList [(a, "xxx"), (b, "yyy")]) [(a,"xxx"),(b,"yyy")]

keys :: t -> [Key t] #

Converts the structure to the list of the keys.

>>> keys (HashMap.fromList [('a', "xxx"), ('b', "yyy")])
"ab"

elems :: t -> [Val t] #

Converts the structure to the list of the values.

>>> elems (HashMap.fromList [('a', "xxx"), ('b', "yyy")])
["xxx","yyy"]

Instances

Instances details
ToPairs (NonEmpty (k, v)) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Key (NonEmpty (k, v)) #

type Val (NonEmpty (k, v)) #

Methods

toPairs :: NonEmpty (k, v) -> [(Key (NonEmpty (k, v)), Val (NonEmpty (k, v)))] #

keys :: NonEmpty (k, v) -> [Key (NonEmpty (k, v))] #

elems :: NonEmpty (k, v) -> [Val (NonEmpty (k, v))] #

ToPairs (IntMap v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Key (IntMap v) #

type Val (IntMap v) #

Methods

toPairs :: IntMap v -> [(Key (IntMap v), Val (IntMap v))] #

keys :: IntMap v -> [Key (IntMap v)] #

elems :: IntMap v -> [Val (IntMap v)] #

ToPairs [(k, v)] 
Instance details

Defined in Universum.Container.Class

Associated Types

type Key [(k, v)] #

type Val [(k, v)] #

Methods

toPairs :: [(k, v)] -> [(Key [(k, v)], Val [(k, v)])] #

keys :: [(k, v)] -> [Key [(k, v)]] #

elems :: [(k, v)] -> [Val [(k, v)]] #

ToPairs (Map k v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Key (Map k v) #

type Val (Map k v) #

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 Val (HashMap k v) #

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 family FromListC l #

Instances

Instances details
type FromListC ByteString 
Instance details

Defined in Universum.Container.Class

type FromListC ByteString 
Instance details

Defined in Universum.Container.Class

type FromListC IntSet 
Instance details

Defined in Universum.Container.Class

type FromListC IntSet = ()
type FromListC Text 
Instance details

Defined in Universum.Container.Class

type FromListC Text = ()
type FromListC Text 
Instance details

Defined in Universum.Container.Class

type FromListC Text = ()
type FromListC (ZipList a) 
Instance details

Defined in Universum.Container.Class

type FromListC (ZipList a) = ()
type FromListC (NonEmpty a) 
Instance details

Defined in Universum.Container.Class

type FromListC (IntMap v) 
Instance details

Defined in Universum.Container.Class

type FromListC (IntMap v) = ()
type FromListC (Seq a) 
Instance details

Defined in Universum.Container.Class

type FromListC (Seq a) = ()
type FromListC (Set a) 
Instance details

Defined in Universum.Container.Class

type FromListC (Set a) = ()
type FromListC (Vector a) 
Instance details

Defined in Universum.Container.Class

type FromListC (Vector a) = ()
type FromListC [a] 
Instance details

Defined in Universum.Container.Class

type FromListC [a] = ()
type FromListC (Map k v) 
Instance details

Defined in Universum.Container.Class

type FromListC (Map k v) = ()
type FromListC (HashMap k v) 
Instance details

Defined in Universum.Container.Class

type FromListC (HashMap k v) = ()

type family ListElement l #

Instances

Instances details
type ListElement ByteString 
Instance details

Defined in Universum.Container.Class

type ListElement ByteString 
Instance details

Defined in Universum.Container.Class

type ListElement IntSet 
Instance details

Defined in Universum.Container.Class

type ListElement Text 
Instance details

Defined in Universum.Container.Class

type ListElement Text 
Instance details

Defined in Universum.Container.Class

type ListElement (ZipList a) 
Instance details

Defined in Universum.Container.Class

type ListElement (ZipList a) = a
type ListElement (NonEmpty a) 
Instance details

Defined in Universum.Container.Class

type ListElement (IntMap v) 
Instance details

Defined in Universum.Container.Class

type ListElement (IntMap v) = Item (IntMap v)
type ListElement (Seq a) 
Instance details

Defined in Universum.Container.Class

type ListElement (Seq a) = Item (Seq a)
type ListElement (Set a) 
Instance details

Defined in Universum.Container.Class

type ListElement (Set a) = Item (Set a)
type ListElement (Vector a) 
Instance details

Defined in Universum.Container.Class

type ListElement (Vector a) = Item (Vector a)
type ListElement [a] 
Instance details

Defined in Universum.Container.Class

type ListElement [a] = Item [a]
type ListElement (Map k v) 
Instance details

Defined in Universum.Container.Class

type ListElement (Map k v) = Item (Map k v)
type ListElement (HashMap k v) 
Instance details

Defined in Universum.Container.Class

type ListElement (HashMap k v) = Item (HashMap k v)

class FromList l where #

Type class for data types that can be constructed from a list.

Minimal complete definition

Nothing

Associated Types

type ListElement l #

type ListElement l = Item l

type FromListC l #

type FromListC l = ()

Methods

fromList :: [ListElement l] -> l #

Make a value from list.

For simple types like '[]' and Set:

 toList . fromList ≡ id
 fromList . toList ≡ id
 

For map-like types:

 toPairs . fromList ≡ id
 fromList . toPairs ≡ id
 

Instances

Instances details
FromList ByteString 
Instance details

Defined in Universum.Container.Class

Associated Types

type ListElement ByteString #

type FromListC ByteString #

FromList ByteString 
Instance details

Defined in Universum.Container.Class

Associated Types

type ListElement ByteString #

type FromListC ByteString #

FromList IntSet 
Instance details

Defined in Universum.Container.Class

Associated Types

type ListElement IntSet #

type FromListC IntSet #

FromList Text 
Instance details

Defined in Universum.Container.Class

Associated Types

type ListElement Text #

type FromListC Text #

Methods

fromList :: [ListElement Text] -> Text #

FromList Text 
Instance details

Defined in Universum.Container.Class

Associated Types

type ListElement Text #

type FromListC Text #

Methods

fromList :: [ListElement Text] -> Text #

FromList (ZipList a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type ListElement (ZipList a) #

type FromListC (ZipList a) #

Methods

fromList :: [ListElement (ZipList a)] -> ZipList a #

FromList (NonEmpty a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type ListElement (NonEmpty a) #

type FromListC (NonEmpty a) #

Methods

fromList :: [ListElement (NonEmpty a)] -> NonEmpty a #

FromList (IntMap v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type ListElement (IntMap v) #

type FromListC (IntMap v) #

Methods

fromList :: [ListElement (IntMap v)] -> IntMap v #

FromList (Seq a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type ListElement (Seq a) #

type FromListC (Seq a) #

Methods

fromList :: [ListElement (Seq a)] -> Seq a #

Ord a => FromList (Set a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type ListElement (Set a) #

type FromListC (Set a) #

Methods

fromList :: [ListElement (Set a)] -> Set a #

FromList (Vector a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type ListElement (Vector a) #

type FromListC (Vector a) #

Methods

fromList :: [ListElement (Vector a)] -> Vector a #

FromList [a] 
Instance details

Defined in Universum.Container.Class

Associated Types

type ListElement [a] #

type FromListC [a] #

Methods

fromList :: [ListElement [a]] -> [a] #

Ord k => FromList (Map k v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type ListElement (Map k v) #

type FromListC (Map k v) #

Methods

fromList :: [ListElement (Map k v)] -> Map k v #

(Eq k, Hashable k) => FromList (HashMap k v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type ListElement (HashMap k v) #

type FromListC (HashMap k v) #

Methods

fromList :: [ListElement (HashMap k v)] -> HashMap k v #

type family Element t #

Type of element for some container. Implemented as an asscociated type family because some containers are monomorphic over element type (like Text, IntSet, etc.) so we can't implement nice interface using old higher-kinded types approach. Implementing this as an associated type family instead of top-level family gives you more control over element types.

Instances

Instances details
type Element ByteString 
Instance details

Defined in Universum.Container.Class

type Element ByteString 
Instance details

Defined in Universum.Container.Class

type Element IntSet 
Instance details

Defined in Universum.Container.Class

type Element Text 
Instance details

Defined in Universum.Container.Class

type Element Text 
Instance details

Defined in Universum.Container.Class

type Element (ZipList a) 
Instance details

Defined in Universum.Container.Class

type Element (ZipList a) = ElementDefault (ZipList a)
type Element (Identity a) 
Instance details

Defined in Universum.Container.Class

type Element (Identity a) = ElementDefault (Identity a)
type Element (First a) 
Instance details

Defined in Universum.Container.Class

type Element (First a) = ElementDefault (First a)
type Element (Last a) 
Instance details

Defined in Universum.Container.Class

type Element (Last a) = ElementDefault (Last a)
type Element (Dual a) 
Instance details

Defined in Universum.Container.Class

type Element (Dual a) = ElementDefault (Dual a)
type Element (Product a) 
Instance details

Defined in Universum.Container.Class

type Element (Product a) = ElementDefault (Product a)
type Element (Sum a) 
Instance details

Defined in Universum.Container.Class

type Element (Sum a) = ElementDefault (Sum a)
type Element (NonEmpty a) 
Instance details

Defined in Universum.Container.Class

type Element (NonEmpty a) = ElementDefault (NonEmpty a)
type Element (IntMap v) 
Instance details

Defined in Universum.Container.Class

type Element (IntMap v) = ElementDefault (IntMap v)
type Element (Seq a) 
Instance details

Defined in Universum.Container.Class

type Element (Seq a) = ElementDefault (Seq a)
type Element (Set v) 
Instance details

Defined in Universum.Container.Class

type Element (Set v) = ElementDefault (Set v)
type Element (HashSet v) 
Instance details

Defined in Universum.Container.Class

type Element (HashSet v) = ElementDefault (HashSet v)
type Element (Vector a) 
Instance details

Defined in Universum.Container.Class

type Element (Vector a) = ElementDefault (Vector a)
type Element (Maybe a) 
Instance details

Defined in Universum.Container.Class

type Element (Maybe a) = ElementDefault (Maybe a)
type Element [a] 
Instance details

Defined in Universum.Container.Class

type Element [a] = ElementDefault [a]
type Element (Either a b) 
Instance details

Defined in Universum.Container.Class

type Element (Either a b) = ElementDefault (Either a b)
type Element (Map k v) 
Instance details

Defined in Universum.Container.Class

type Element (Map k v) = ElementDefault (Map k v)
type Element (HashMap k v) 
Instance details

Defined in Universum.Container.Class

type Element (HashMap k v) = ElementDefault (HashMap k v)
type Element (a, b) 
Instance details

Defined in Universum.Container.Class

type Element (a, b) = ElementDefault (a, b)
type Element (Const a b) 
Instance details

Defined in Universum.Container.Class

type Element (Const a b) = ElementDefault (Const a b)

class Container t where #

Very similar to Foldable but also allows instances for monomorphic types like Text but forbids instances for Maybe and similar. This class is used as a replacement for Foldable type class. It solves the following problems:

  1. length, foldr and other functions work on more types for which it makes sense.
  2. You can't accidentally use length on polymorphic Foldable (like list), replace list with Maybe and then debug error for two days.
  3. More efficient implementaions of functions for polymorphic types (like elem for Set).

The drawbacks:

  1. Type signatures of polymorphic functions look more scary.
  2. Orphan instances are involved if you want to use foldr (and similar) on types from libraries.

Minimal complete definition

Nothing

Associated Types

type Element t #

Type of element for some container. Implemented as an asscociated type family because some containers are monomorphic over element type (like Text, IntSet, etc.) so we can't implement nice interface using old higher-kinded types approach. Implementing this as an associated type family instead of top-level family gives you more control over element types.

type Element t = ElementDefault t

Methods

toList :: t -> [Element t] #

Convert container to list of elements.

>>> toList @Text "aba"
"aba"
>>> :t toList @Text "aba"
toList @Text "aba" :: [Char]

null :: t -> Bool #

Checks whether container is empty.

>>> null @Text ""
True
>>> null @Text "aba"
False

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 #

foldMap :: Monoid m => (Element t -> m) -> t -> m #

fold :: t -> Element t #

foldr' :: (Element t -> b -> b) -> b -> t -> b #

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) #

safeMaximum :: t -> Maybe (Element t) #

safeMinimum :: t -> Maybe (Element t) #

safeFoldr1 :: (Element t -> Element t -> Element t) -> t -> Maybe (Element t) #

safeFoldl1 :: (Element t -> Element t -> Element t) -> t -> Maybe (Element t) #

Instances

Instances details
Container ByteString 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element ByteString #

Container ByteString 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element ByteString #

Container IntSet 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element IntSet #

Container Text 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element Text #

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 #

foldMap :: Monoid m => (Element Text -> m) -> Text -> m #

fold :: Text -> Element Text #

foldr' :: (Element Text -> b -> b) -> b -> Text -> b #

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) #

safeMaximum :: Text -> Maybe (Element Text) #

safeMinimum :: Text -> Maybe (Element Text) #

safeFoldr1 :: (Element Text -> Element Text -> Element Text) -> Text -> Maybe (Element Text) #

safeFoldl1 :: (Element Text -> Element Text -> Element Text) -> Text -> Maybe (Element Text) #

Container Text 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element Text #

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 #

foldMap :: Monoid m => (Element Text -> m) -> Text -> m #

fold :: Text -> Element Text #

foldr' :: (Element Text -> b -> b) -> b -> Text -> b #

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) #

safeMaximum :: Text -> Maybe (Element Text) #

safeMinimum :: Text -> Maybe (Element Text) #

safeFoldr1 :: (Element Text -> Element Text -> Element Text) -> Text -> Maybe (Element Text) #

safeFoldl1 :: (Element Text -> Element Text -> Element Text) -> Text -> Maybe (Element Text) #

Container (ZipList a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (ZipList a) #

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 #

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 #

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)) #

safeMaximum :: ZipList a -> Maybe (Element (ZipList a)) #

safeMinimum :: ZipList a -> Maybe (Element (ZipList a)) #

safeFoldr1 :: (Element (ZipList a) -> Element (ZipList a) -> Element (ZipList a)) -> ZipList a -> Maybe (Element (ZipList a)) #

safeFoldl1 :: (Element (ZipList a) -> Element (ZipList a) -> Element (ZipList a)) -> 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) #

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 #

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 #

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)) #

safeMaximum :: Identity a -> Maybe (Element (Identity a)) #

safeMinimum :: Identity a -> Maybe (Element (Identity a)) #

safeFoldr1 :: (Element (Identity a) -> Element (Identity a) -> Element (Identity a)) -> Identity a -> Maybe (Element (Identity a)) #

safeFoldl1 :: (Element (Identity a) -> Element (Identity a) -> Element (Identity a)) -> Identity a -> Maybe (Element (Identity a)) #

Container (First a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (First a) #

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 #

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 #

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)) #

safeMaximum :: First a -> Maybe (Element (First a)) #

safeMinimum :: First a -> Maybe (Element (First a)) #

safeFoldr1 :: (Element (First a) -> Element (First a) -> Element (First a)) -> First a -> Maybe (Element (First a)) #

safeFoldl1 :: (Element (First a) -> Element (First a) -> Element (First a)) -> First a -> Maybe (Element (First a)) #

Container (Last a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Last a) #

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 #

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 #

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)) #

safeMaximum :: Last a -> Maybe (Element (Last a)) #

safeMinimum :: Last a -> Maybe (Element (Last a)) #

safeFoldr1 :: (Element (Last a) -> Element (Last a) -> Element (Last a)) -> Last a -> Maybe (Element (Last a)) #

safeFoldl1 :: (Element (Last a) -> Element (Last a) -> Element (Last a)) -> Last a -> Maybe (Element (Last a)) #

Container (Dual a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Dual a) #

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 #

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 #

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)) #

safeMaximum :: Dual a -> Maybe (Element (Dual a)) #

safeMinimum :: Dual a -> Maybe (Element (Dual a)) #

safeFoldr1 :: (Element (Dual a) -> Element (Dual a) -> Element (Dual a)) -> Dual a -> Maybe (Element (Dual a)) #

safeFoldl1 :: (Element (Dual a) -> Element (Dual a) -> Element (Dual a)) -> Dual a -> Maybe (Element (Dual a)) #

Container (Product a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Product a) #

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 #

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 #

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)) #

safeMaximum :: Product a -> Maybe (Element (Product a)) #

safeMinimum :: Product a -> Maybe (Element (Product a)) #

safeFoldr1 :: (Element (Product a) -> Element (Product a) -> Element (Product a)) -> Product a -> Maybe (Element (Product a)) #

safeFoldl1 :: (Element (Product a) -> Element (Product a) -> Element (Product a)) -> Product a -> Maybe (Element (Product a)) #

Container (Sum a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Sum a) #

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 #

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 #

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)) #

safeMaximum :: Sum a -> Maybe (Element (Sum a)) #

safeMinimum :: Sum a -> Maybe (Element (Sum a)) #

safeFoldr1 :: (Element (Sum a) -> Element (Sum a) -> Element (Sum a)) -> Sum a -> Maybe (Element (Sum a)) #

safeFoldl1 :: (Element (Sum a) -> Element (Sum a) -> Element (Sum a)) -> Sum a -> Maybe (Element (Sum a)) #

Container (NonEmpty a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (NonEmpty a) #

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 #

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 #

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)) #

safeMaximum :: NonEmpty a -> Maybe (Element (NonEmpty a)) #

safeMinimum :: NonEmpty a -> Maybe (Element (NonEmpty a)) #

safeFoldr1 :: (Element (NonEmpty a) -> Element (NonEmpty a) -> Element (NonEmpty a)) -> NonEmpty a -> Maybe (Element (NonEmpty a)) #

safeFoldl1 :: (Element (NonEmpty a) -> Element (NonEmpty a) -> Element (NonEmpty a)) -> NonEmpty a -> Maybe (Element (NonEmpty a)) #

Container (IntMap v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (IntMap v) #

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 #

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 #

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)) #

safeMaximum :: IntMap v -> Maybe (Element (IntMap v)) #

safeMinimum :: IntMap v -> Maybe (Element (IntMap v)) #

safeFoldr1 :: (Element (IntMap v) -> Element (IntMap v) -> Element (IntMap v)) -> IntMap v -> Maybe (Element (IntMap v)) #

safeFoldl1 :: (Element (IntMap v) -> Element (IntMap v) -> Element (IntMap v)) -> IntMap v -> Maybe (Element (IntMap v)) #

Container (Seq a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Seq a) #

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 #

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 #

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)) #

safeMaximum :: Seq a -> Maybe (Element (Seq a)) #

safeMinimum :: Seq a -> Maybe (Element (Seq a)) #

safeFoldr1 :: (Element (Seq a) -> Element (Seq a) -> Element (Seq a)) -> Seq a -> Maybe (Element (Seq a)) #

safeFoldl1 :: (Element (Seq a) -> Element (Seq a) -> Element (Seq a)) -> Seq a -> Maybe (Element (Seq a)) #

Ord v => Container (Set v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Set v) #

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 #

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 #

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)) #

safeMaximum :: Set v -> Maybe (Element (Set v)) #

safeMinimum :: Set v -> Maybe (Element (Set v)) #

safeFoldr1 :: (Element (Set v) -> Element (Set v) -> Element (Set v)) -> Set v -> Maybe (Element (Set v)) #

safeFoldl1 :: (Element (Set v) -> Element (Set v) -> Element (Set v)) -> Set v -> Maybe (Element (Set v)) #

(Eq v, Hashable v) => Container (HashSet v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (HashSet v) #

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 #

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 #

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)) #

safeMaximum :: HashSet v -> Maybe (Element (HashSet v)) #

safeMinimum :: HashSet v -> Maybe (Element (HashSet v)) #

safeFoldr1 :: (Element (HashSet v) -> Element (HashSet v) -> Element (HashSet v)) -> HashSet v -> Maybe (Element (HashSet v)) #

safeFoldl1 :: (Element (HashSet v) -> Element (HashSet v) -> Element (HashSet v)) -> HashSet v -> Maybe (Element (HashSet v)) #

Container (Vector a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Vector a) #

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 #

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 #

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)) #

safeMaximum :: Vector a -> Maybe (Element (Vector a)) #

safeMinimum :: Vector a -> Maybe (Element (Vector a)) #

safeFoldr1 :: (Element (Vector a) -> Element (Vector a) -> Element (Vector a)) -> Vector a -> Maybe (Element (Vector a)) #

safeFoldl1 :: (Element (Vector a) -> Element (Vector a) -> Element (Vector a)) -> Vector a -> Maybe (Element (Vector a)) #

(TypeError (DisallowInstance "Maybe") :: Constraint) => Container (Maybe a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Maybe a) #

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 #

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 #

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)) #

safeMaximum :: Maybe a -> Maybe (Element (Maybe a)) #

safeMinimum :: Maybe a -> Maybe (Element (Maybe a)) #

safeFoldr1 :: (Element (Maybe a) -> Element (Maybe a) -> Element (Maybe a)) -> Maybe a -> Maybe (Element (Maybe a)) #

safeFoldl1 :: (Element (Maybe a) -> Element (Maybe a) -> Element (Maybe a)) -> Maybe a -> Maybe (Element (Maybe a)) #

Container [a] 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element [a] #

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 #

foldMap :: Monoid m => (Element [a] -> m) -> [a] -> m #

fold :: [a] -> Element [a] #

foldr' :: (Element [a] -> b -> b) -> b -> [a] -> b #

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]) #

safeMaximum :: [a] -> Maybe (Element [a]) #

safeMinimum :: [a] -> Maybe (Element [a]) #

safeFoldr1 :: (Element [a] -> Element [a] -> Element [a]) -> [a] -> Maybe (Element [a]) #

safeFoldl1 :: (Element [a] -> Element [a] -> Element [a]) -> [a] -> Maybe (Element [a]) #

(TypeError (DisallowInstance "Either") :: Constraint) => Container (Either a b) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Either a b) #

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 #

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 #

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)) #

safeMaximum :: Either a b -> Maybe (Element (Either a b)) #

safeMinimum :: Either a b -> Maybe (Element (Either a b)) #

safeFoldr1 :: (Element (Either a b) -> Element (Either a b) -> Element (Either a b)) -> Either a b -> Maybe (Element (Either a b)) #

safeFoldl1 :: (Element (Either a b) -> Element (Either a b) -> Element (Either a b)) -> Either a b -> Maybe (Element (Either a b)) #

Container (Map k v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Map k v) #

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 #

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 #

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)) #

safeMaximum :: Map k v -> Maybe (Element (Map k v)) #

safeMinimum :: Map k v -> Maybe (Element (Map k v)) #

safeFoldr1 :: (Element (Map k v) -> Element (Map k v) -> Element (Map k v)) -> Map k v -> Maybe (Element (Map k v)) #

safeFoldl1 :: (Element (Map k v) -> Element (Map k v) -> Element (Map k v)) -> 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) #

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 #

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 #

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)) #

safeMaximum :: HashMap k v -> Maybe (Element (HashMap k v)) #

safeMinimum :: HashMap k v -> Maybe (Element (HashMap k v)) #

safeFoldr1 :: (Element (HashMap k v) -> Element (HashMap k v) -> Element (HashMap k v)) -> HashMap k v -> Maybe (Element (HashMap k v)) #

safeFoldl1 :: (Element (HashMap k v) -> Element (HashMap k v) -> Element (HashMap k v)) -> HashMap k v -> Maybe (Element (HashMap k v)) #

(TypeError (DisallowInstance "tuple") :: Constraint) => Container (a, b) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (a, b) #

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 #

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 #

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)) #

safeMaximum :: (a, b) -> Maybe (Element (a, b)) #

safeMinimum :: (a, b) -> Maybe (Element (a, b)) #

safeFoldr1 :: (Element (a, b) -> Element (a, b) -> Element (a, b)) -> (a, b) -> Maybe (Element (a, b)) #

safeFoldl1 :: (Element (a, b) -> Element (a, b) -> Element (a, b)) -> (a, b) -> Maybe (Element (a, b)) #

Container (Const a b) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Const a b) #

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 #

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 #

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)) #

safeMaximum :: Const a b -> Maybe (Element (Const a b)) #

safeMinimum :: Const a b -> Maybe (Element (Const a b)) #

safeFoldr1 :: (Element (Const a b) -> Element (Const a b) -> Element (Const a b)) -> Const a b -> Maybe (Element (Const a b)) #

safeFoldl1 :: (Element (Const a b) -> Element (Const a b) -> Element (Const a b)) -> Const a b -> Maybe (Element (Const a b)) #

type family OneItem x #

Instances

Instances details
type OneItem ByteString 
Instance details

Defined in Universum.Container.Class

type OneItem ByteString 
Instance details

Defined in Universum.Container.Class

type OneItem IntSet 
Instance details

Defined in Universum.Container.Class

type OneItem Text 
Instance details

Defined in Universum.Container.Class

type OneItem Text 
Instance details

Defined in Universum.Container.Class

type OneItem (NonEmpty a) 
Instance details

Defined in Universum.Container.Class

type OneItem (NonEmpty a) = a
type OneItem (IntMap v) 
Instance details

Defined in Universum.Container.Class

type OneItem (IntMap v) = (Int, v)
type OneItem (Seq a) 
Instance details

Defined in Universum.Container.Class

type OneItem (Seq a) = a
type OneItem (Set v) 
Instance details

Defined in Universum.Container.Class

type OneItem (Set v) = v
type OneItem (HashSet v) 
Instance details

Defined in Universum.Container.Class

type OneItem (HashSet v) = v
type OneItem (Vector a) 
Instance details

Defined in Universum.Container.Class

type OneItem (Vector a) = a
type OneItem (Vector a) 
Instance details

Defined in Universum.Container.Class

type OneItem (Vector a) = a
type OneItem (Vector a) 
Instance details

Defined in Universum.Container.Class

type OneItem (Vector a) = a
type OneItem (Vector a) 
Instance details

Defined in Universum.Container.Class

type OneItem (Vector a) = a
type OneItem [a] 
Instance details

Defined in Universum.Container.Class

type OneItem [a] = a
type OneItem (Map k v) 
Instance details

Defined in Universum.Container.Class

type OneItem (Map k v) = (k, v)
type OneItem (HashMap k v) 
Instance details

Defined in Universum.Container.Class

type OneItem (HashMap k v) = (k, v)

class One x where #

Type class for types that can be created from one element. singleton is lone name for this function. Also constructions of different type differ: :[] for lists, two arguments for Maps. Also some data types are monomorphic.

>>> one True :: [Bool]
[True]
>>> one 'a' :: Text
"a"
>>> one (3, "hello") :: HashMap Int String
fromList [(3,"hello")]

Associated Types

type OneItem x #

Methods

one :: OneItem x -> x #

Create a list, map, Text, etc from a single element.

Instances

Instances details
One ByteString 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem ByteString #

One ByteString 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem ByteString #

One IntSet 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem IntSet #

Methods

one :: OneItem IntSet -> IntSet #

One Text 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem Text #

Methods

one :: OneItem Text -> Text #

One Text 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem Text #

Methods

one :: OneItem Text -> Text #

One (NonEmpty a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (NonEmpty a) #

Methods

one :: OneItem (NonEmpty a) -> NonEmpty a #

One (IntMap v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (IntMap v) #

Methods

one :: OneItem (IntMap v) -> IntMap v #

One (Seq a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (Seq a) #

Methods

one :: OneItem (Seq a) -> Seq a #

One (Set v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (Set v) #

Methods

one :: OneItem (Set v) -> Set v #

Hashable v => One (HashSet v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (HashSet v) #

Methods

one :: OneItem (HashSet v) -> HashSet v #

One (Vector a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (Vector a) #

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) #

Methods

one :: OneItem (Vector a) -> Vector a #

Storable a => One (Vector a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (Vector a) #

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) #

Methods

one :: OneItem (Vector a) -> Vector a #

One [a] 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem [a] #

Methods

one :: OneItem [a] -> [a] #

One (Map k v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (Map k v) #

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) #

Methods

one :: OneItem (HashMap k v) -> HashMap k v #

maybeToMonoid :: Monoid m => Maybe m -> m #

Extracts Monoid value from Maybe returning mempty if Nothing.

>>> maybeToMonoid (Just [1,2,3] :: Maybe [Int])
[1,2,3]
>>> maybeToMonoid (Nothing :: Maybe [Int])
[]

hoistEither :: forall (m :: Type -> Type) e a. Applicative m => Either e a -> ExceptT e m a #

Lift a Either to the ExceptT monad

hoistMaybe :: forall (m :: Type -> Type) a. Applicative m => Maybe a -> MaybeT m a #

Lift a Maybe to the MaybeT monad

executingState :: s -> State s a -> s #

Alias for flip execState. It's not shorter but sometimes more readable. Done by analogy with using* functions family.

executingStateT :: Functor f => s -> StateT s f a -> f s #

Alias for flip execStateT. It's not shorter but sometimes more readable. Done by analogy with using* functions family.

evaluatingState :: s -> State s a -> a #

Alias for flip evalState. It's not shorter but sometimes more readable. Done by analogy with using* functions family.

evaluatingStateT :: Functor f => s -> StateT s f a -> f a #

Alias for flip evalStateT. It's not shorter but sometimes more readable. Done by analogy with using* functions family.

usingState :: s -> State s a -> (a, s) #

Shorter and more readable alias for flip runState.

usingStateT :: s -> StateT s m a -> m (a, s) #

Shorter and more readable alias for flip runStateT.

usingReader :: r -> Reader r a -> a #

Shorter and more readable alias for flip runReader.

usingReaderT :: r -> ReaderT r m a -> m a #

Shorter and more readable alias for flip runReaderT.

whenRightM :: Monad m => m (Either l r) -> (r -> m ()) -> m () #

Monadic version of whenRight.

whenRight :: Applicative f => Either l r -> (r -> f ()) -> f () #

Applies given action to Either content if Right is given.

whenLeftM :: Monad m => m (Either l r) -> (l -> m ()) -> m () #

Monadic version of whenLeft.

whenLeft :: Applicative f => Either l r -> (l -> f ()) -> f () #

Applies given action to Either content if Left is given.

maybeToLeft :: r -> Maybe l -> Either l r #

Maps Maybe to Either wrapping default value into Right.

>>> maybeToLeft True (Just "aba")
Left "aba"
>>> maybeToLeft True Nothing
Right True

maybeToRight :: l -> Maybe r -> Either l r #

Maps Maybe to Either wrapping default value into Left.

>>> maybeToRight True (Just "aba")
Right "aba"
>>> maybeToRight True Nothing
Left True

rightToMaybe :: Either l r -> Maybe r #

Maps right part of Either to Maybe.

>>> rightToMaybe (Left True)
Nothing
>>> rightToMaybe (Right "aba")
Just "aba"

leftToMaybe :: Either l r -> Maybe l #

Maps left part of Either to Maybe.

>>> leftToMaybe (Left True)
Just True
>>> leftToMaybe (Right "aba")
Nothing

fromRight :: b -> Either a b -> b #

Extracts value from Right or return given default value.

>>> fromRight 0 (Left 3)
0
>>> fromRight 0 (Right 5)
5

fromLeft :: a -> Either a b -> a #

Extracts value from Left or return given default value.

>>> fromLeft 0 (Left 3)
3
>>> fromLeft 0 (Right 5)
0

whenNothingM_ :: Monad m => m (Maybe a) -> m () -> m () #

Monadic version of whenNothingM_.

whenNothingM :: Monad m => m (Maybe a) -> m a -> m a #

Monadic version of whenNothing.

whenNothing_ :: Applicative f => Maybe a -> f () -> f () #

Performs default Applicative action if Nothing is given. Do nothing for Just. Convenient for discarding Just content.

>>> whenNothing_ Nothing $ putTextLn "Nothing!"
Nothing!
>>> whenNothing_ (Just True) $ putTextLn "Nothing!"

whenNothing :: Applicative f => Maybe a -> f a -> f a #

Performs default Applicative action if Nothing is given. Otherwise returns content of Just pured to Applicative.

>>> whenNothing Nothing [True, False]
[True,False]
>>> whenNothing (Just True) [True, False]
[True]

whenJustM :: Monad m => m (Maybe a) -> (a -> m ()) -> m () #

Monadic version of whenJust.

whenJust :: Applicative f => Maybe a -> (a -> f ()) -> f () #

Specialized version of for_ for Maybe. It's used for code readability. Also helps to avoid space leaks: Foldable.mapM_ space leak.

>>> whenJust Nothing $ \b -> print (not b)
>>> whenJust (Just True) $ \b -> print (not b)
False

(?:) :: Maybe a -> a -> a infixr 0 #

Similar to fromMaybe but with flipped arguments.

>>> readMaybe "True" ?: False
True
>>> readMaybe "Tru" ?: False
False

atomicWriteIORef :: MonadIO m => IORef a -> a -> m () #

Lifted version of atomicWriteIORef.

atomicModifyIORef' :: MonadIO m => IORef a -> (a -> (a, b)) -> m b #

Lifted version of atomicModifyIORef'.

atomicModifyIORef :: MonadIO m => IORef a -> (a -> (a, b)) -> m b #

Lifted version of atomicModifyIORef.

modifyIORef' :: MonadIO m => IORef a -> (a -> a) -> m () #

Lifted version of modifyIORef'.

modifyIORef :: MonadIO m => IORef a -> (a -> a) -> m () #

Lifted version of modifyIORef.

writeIORef :: MonadIO m => IORef a -> a -> m () #

Lifted version of writeIORef.

readIORef :: MonadIO m => IORef a -> m a #

Lifted version of readIORef.

newIORef :: MonadIO m => a -> m (IORef a) #

Lifted version of newIORef.

withFile :: (MonadIO m, MonadMask m) => FilePath -> IOMode -> (Handle -> m a) -> m a #

Opens a file, manipulates it with the provided function and closes the handle before returning. The Handle can be written to using the hPutStr and hPutStrLn functions.

withFile is essentially the bracket pattern, specialized to files. This should be preferred over openFile + hClose as it properly deals with (asynchronous) exceptions. In cases where withFile is insufficient, for instance because the it is not statically known when manipulating the Handle has finished, one should consider other safe paradigms for resource usage, such as the ResourceT transformer from the resourcet package, before resorting to openFile and hClose.

hClose :: MonadIO m => Handle -> m () #

Close a file handle

See also withFile for more information.

openFile :: MonadIO m => FilePath -> IOMode -> m Handle #

Lifted version of openFile.

See also withFile for more information.

writeFile :: MonadIO m => FilePath -> Text -> m () #

Lifted version of writeFile.

readFile :: MonadIO m => FilePath -> m Text #

Lifted version of readFile.

getLine :: MonadIO m => m Text #

Lifted version of getLine.

appendFile :: MonadIO m => FilePath -> Text -> m () #

Lifted version of appendFile.

die :: MonadIO m => String -> m a #

Lifted version of die. die is available since base-4.8, but it's more convenient to redefine it instead of using CPP.

exitSuccess :: MonadIO m => m a #

Lifted version of exitSuccess.

exitFailure :: MonadIO m => m a #

Lifted version of exitFailure.

exitWith :: MonadIO m => ExitCode -> m a #

Lifted version of exitWith.

updateTVar' :: TVar s -> StateT s STM a -> STM a #

Like 'modifyTVar'', but modification is specified as a State monad.

updateMVar' :: MonadIO m => MVar s -> StateT s IO a -> m a #

Like modifyMVar, but modification is specified as a State computation.

This method is strict in produced s value.

readTVarIO :: MonadIO m => TVar a -> m a #

Lifted to MonadIO version of readTVarIO.

newTVarIO :: MonadIO m => a -> m (TVar a) #

Lifted to MonadIO version of newTVarIO.

tryTakeMVar :: MonadIO m => MVar a -> m (Maybe a) #

Lifted to MonadIO version of tryTakeMVar.

tryReadMVar :: MonadIO m => MVar a -> m (Maybe a) #

Lifted to MonadIO version of tryReadMVar.

tryPutMVar :: MonadIO m => MVar a -> a -> m Bool #

Lifted to MonadIO version of tryPutMVar.

takeMVar :: MonadIO m => MVar a -> m a #

Lifted to MonadIO version of takeMVar.

swapMVar :: MonadIO m => MVar a -> a -> m a #

Lifted to MonadIO version of swapMVar.

readMVar :: MonadIO m => MVar a -> m a #

Lifted to MonadIO version of readMVar.

putMVar :: MonadIO m => MVar a -> a -> m () #

Lifted to MonadIO version of putMVar.

newMVar :: MonadIO m => a -> m (MVar a) #

Lifted to MonadIO version of newMVar.

newEmptyMVar :: MonadIO m => m (MVar a) #

Lifted to MonadIO version of newEmptyMVar.

(<<$>>) :: (Functor f, Functor g) => (a -> b) -> f (g a) -> f (g b) infixl 4 #

Alias for fmap . fmap. Convenient to work with two nested Functors.

>>> negate <<$>> Just [1,2,3]
Just [-1,-2,-3]

map :: Functor f => (a -> b) -> f a -> f b #

map generalized to Functor.

>>> map not (Just True)
Just False
>>> map not [True,False,True,True]
[False,True,False,False]

($!) :: (a -> b) -> a -> b infixr 0 #

Stricter version of $ operator. Default Prelude defines this at the toplevel module, so we do as well.

>>> const 3 $ Prelude.undefined
3
>>> const 3 $! Prelude.undefined
*** Exception: Prelude.undefined
...

someNE :: Alternative f => f a -> f (NonEmpty a) #

Similar to some, but reflects in types that a non-empty list is returned.

pass :: Applicative f => f () #

Shorter alias for pure ().

>>> pass :: Maybe ()
Just ()

data UUID #

Type representing Universally Unique Identifiers (UUID) as specified in RFC 4122.

Instances

Instances details
FromJSON UUID 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey UUID 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON UUID 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey UUID 
Instance details

Defined in Data.Aeson.Types.ToJSON

Data UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UUID -> c UUID #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UUID #

toConstr :: UUID -> Constr #

dataTypeOf :: UUID -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UUID) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UUID) #

gmapT :: (forall b. Data b => b -> b) -> UUID -> UUID #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UUID -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UUID -> r #

gmapQ :: (forall d. Data d => d -> u) -> UUID -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UUID -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UUID -> m UUID #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UUID -> m UUID #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UUID -> m UUID #

Storable UUID

This Storable instance uses the memory layout as described in RFC 4122, but in contrast to the Binary instance, the fields are stored in host byte order.

Instance details

Defined in Data.UUID.Types.Internal

Methods

sizeOf :: UUID -> Int #

alignment :: UUID -> Int #

peekElemOff :: Ptr UUID -> Int -> IO UUID #

pokeElemOff :: Ptr UUID -> Int -> UUID -> IO () #

peekByteOff :: Ptr b -> Int -> IO UUID #

pokeByteOff :: Ptr b -> Int -> UUID -> IO () #

peek :: Ptr UUID -> IO UUID #

poke :: Ptr UUID -> UUID -> IO () #

Read UUID 
Instance details

Defined in Data.UUID.Types.Internal

Show UUID

Pretty prints a UUID (without quotation marks). See also toString.

>>> show nil
"00000000-0000-0000-0000-000000000000"
Instance details

Defined in Data.UUID.Types.Internal

Methods

showsPrec :: Int -> UUID -> ShowS #

show :: UUID -> String #

showList :: [UUID] -> ShowS #

Binary UUID

This Binary instance is compatible with RFC 4122, storing the fields in network order as 16 bytes.

Instance details

Defined in Data.UUID.Types.Internal

Methods

put :: UUID -> Put #

get :: Get UUID #

putList :: [UUID] -> Put #

NFData UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

rnf :: UUID -> () #

Eq UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

(==) :: UUID -> UUID -> Bool #

(/=) :: UUID -> UUID -> Bool #

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 #

Hashable UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

hashWithSalt :: Int -> UUID -> Int #

hash :: UUID -> Int #

FromHttpApiData UUID 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData UUID 
Instance details

Defined in Web.Internal.HttpApiData

Random UUID

This Random instance produces insecure version 4 UUIDs as specified in RFC 4122.

Instance details

Defined in Data.UUID.Types.Internal

Methods

randomR :: RandomGen g => (UUID, UUID) -> g -> (UUID, g) #

random :: RandomGen g => g -> (UUID, g) #

randomRs :: RandomGen g => (UUID, UUID) -> g -> [UUID] #

randoms :: RandomGen g => g -> [UUID] #

Uniform UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

uniformM :: StatefulGen g m => g -> m UUID #

Lift UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

lift :: Quote m => UUID -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => UUID -> Code m UUID #

withSource :: source2 -> TryFromException source1 t -> TryFromException source2 t #

withTarget :: forall target2 source target1. TryFromException source target1 -> TryFromException source target2 #

class From source target #

Instances

Instances details
From Int64 RowQty Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Int64 -> RowQty

From Word64 BlkHeight Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Word64 -> BlkHeight

From Word64 Nonce Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Word64 -> Nonce

From Word64 MSat Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Methods

from :: Word64 -> MSat

From Word64 Seconds Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Methods

from :: Word64 -> Seconds

From BlkHash BlockHash Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: BlkHash -> BlockHash

From BlkHeight Word64 Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: BlkHeight -> Word64

From BlkHeight BlockHeight Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: BlkHeight -> BlockHeight

From BlkHeight Natural Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: BlkHeight -> Natural

From FeeRate Rational Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: FeeRate -> Rational

From FeeRate FeeRate Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

Methods

from :: FeeRate0 -> FeeRate

From FeeRate Urational Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

Methods

from :: FeeRate -> Urational

From NodePubKeyHex Text Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: NodePubKeyHex -> Text

From NodeUriHex Text Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: NodeUriHex -> Text

From Nonce Word64 Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Nonce -> Word64

From Nonce Nonce Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

Methods

from :: Nonce0 -> Nonce

From Privacy Privacy Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

Methods

from :: Privacy0 -> Privacy

From RHashHex RHash Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: RHashHex -> RHash

From RHashHex Text Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: RHashHex -> Text

From RowQty Int64 Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: RowQty -> Int64

From SigHeaderName ByteString Source # 
Instance details

Defined in BtcLsp.Grpc.Data

From SigHeaderName Text Source # 
Instance details

Defined in BtcLsp.Grpc.Data

Methods

from :: SigHeaderName -> Text

From InQty Natural Source # 
Instance details

Defined in BtcLsp.Math.OnChain

Methods

from :: InQty -> Natural

From OutQty Natural Source # 
Instance details

Defined in BtcLsp.Math.OnChain

Methods

from :: OutQty -> Natural

From FundMoney MSat Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

Methods

from :: FundMoney -> MSat

From LnPubKey NodePubKey Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

Methods

from :: LnPubKey -> NodePubKey

From Nonce Nonce Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

Methods

from :: Nonce -> Nonce0

From Privacy Privacy Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

Methods

from :: Privacy -> Privacy0

From Msat MSat Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

Methods

from :: Msat -> MSat

From MSat Word64 Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Methods

from :: MSat -> Word64

From MSat FundMoney Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

Methods

from :: MSat -> FundMoney

From MSat Msat Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

Methods

from :: MSat -> Msat

From NodePubKey LnPubKey Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

Methods

from :: NodePubKey -> LnPubKey

From PaymentRequest Text Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Methods

from :: PaymentRequest -> Text

From RHash RHashHex Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: RHash -> RHashHex

From Seconds Word64 Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Methods

from :: Seconds -> Word64

From HostName LnHost Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

Methods

from :: HostName -> LnHost

From PortNumber Word32 Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

Methods

from :: PortNumber -> Word32

From PortNumber LnPort Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

Methods

from :: PortNumber -> LnPort

From BlockHash BlkHash Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: BlockHash -> BlkHash

From Text NodePubKeyHex Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Text -> NodePubKeyHex

From Text NodeUriHex Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Text -> NodeUriHex

From Text RHashHex Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Text -> RHashHex

From Text SigHeaderName Source # 
Instance details

Defined in BtcLsp.Grpc.Data

Methods

from :: Text -> SigHeaderName

From Text PaymentRequest Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Methods

from :: Text -> PaymentRequest

From Natural InQty Source # 
Instance details

Defined in BtcLsp.Math.OnChain

Methods

from :: Natural -> InQty

From Natural OutQty Source # 
Instance details

Defined in BtcLsp.Math.OnChain

Methods

from :: Natural -> OutQty

From Int RowQty Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Int -> RowQty

From Word32 (Vout 'Funding) Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Methods

from :: Word32 -> Vout 'Funding

From FeeRate (Ratio Word64) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: FeeRate -> Ratio Word64

From FeeRate (Ratio Natural) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: FeeRate -> Ratio Natural

From Vbyte (Ratio Natural) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Vbyte -> Ratio Natural

From SatPerVbyte (Ratio Natural) Source # 
Instance details

Defined in BtcLsp.Math.OnChain

From FundLnInvoice (LnInvoice 'Fund) Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

From RefundOnChainAddress (UnsafeOnChainAddress 'Refund) Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

From LnInvoice (LnInvoice mrel) Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

Methods

from :: LnInvoice -> LnInvoice0 mrel

From OnChainAddress (UnsafeOnChainAddress 'Refund) Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

From ByteString (TxId 'Funding) Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Methods

from :: ByteString -> TxId 'Funding

From NewAddressResponse (OnChainAddress 'Fund) Source # 
Instance details

Defined in BtcLsp.Data.Smart

Methods

from :: NewAddressResponse -> OnChainAddress 'Fund

From NewAddressResponse (OnChainAddress 'Gain) Source # 
Instance details

Defined in BtcLsp.Data.Smart

Methods

from :: NewAddressResponse -> OnChainAddress 'Gain

From PaymentRequest (LnInvoice mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: PaymentRequest -> LnInvoice mrel

From Text (LnInvoice mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Text -> LnInvoice mrel

From Text (UnsafeOnChainAddress mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Text -> UnsafeOnChainAddress mrel

From Word64 (Money owner btcl mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Word64 -> Money owner btcl mrel

From MSat (Money owner btcl mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: MSat -> Money owner btcl mrel

From (Ratio Word64) FeeRate Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Ratio Word64 -> FeeRate

From (Ratio Natural) Vbyte Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Ratio Natural -> Vbyte

From (Ratio Natural) SatPerVbyte Source # 
Instance details

Defined in BtcLsp.Math.OnChain

From (OnChainAddress 'Fund) FundOnChainAddress Source # 
Instance details

Defined in BtcLsp.Data.Smart

From (OnChainAddress 'Refund) RefundOnChainAddress Source # 
Instance details

Defined in BtcLsp.Data.Smart

From (OnChainAddress mrel) OnChainAddress Source # 
Instance details

Defined in BtcLsp.Data.Smart

From (OnChainAddress mrel) Text Source # 
Instance details

Defined in BtcLsp.Data.Smart

Methods

from :: OnChainAddress mrel -> Text

From (LnInvoice 'Fund) FundLnInvoice Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

From (LnInvoice mrel) LnInvoice Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

Methods

from :: LnInvoice0 mrel -> LnInvoice

From (LnInvoice mrel) PaymentRequest Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: LnInvoice mrel -> PaymentRequest

From (LnInvoice mrel) Text Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: LnInvoice mrel -> Text

From (UnsafeOnChainAddress mrel) Text Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: UnsafeOnChainAddress mrel -> Text

From (Money 'Lsp btcl 'Gain) FeeMoney Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

Methods

from :: Money 'Lsp btcl 'Gain -> FeeMoney

From (Money 'Usr btcl 'Fund) LocalBalance Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

Methods

from :: Money 'Usr btcl 'Fund -> LocalBalance

From (Money owner btcl mrel) Rational Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Money owner btcl mrel -> Rational

From (Money owner btcl mrel) Word64 Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Money owner btcl mrel -> Word64

From (Money owner btcl mrel) Msat Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

Methods

from :: Money owner btcl mrel -> Msat

From (Money owner btcl mrel) MSat Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Money owner btcl mrel -> MSat

From (Money owner btcl mrel) Natural Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Money owner btcl mrel -> Natural

From (Money owner btcl mrel) (Ratio Natural) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Money owner btcl mrel -> Ratio Natural

class TryFrom source target #

Minimal complete definition

tryFrom

Instances

Instances details
TryFrom Rational FeeRate Source # 
Instance details

Defined in BtcLsp.Data.Type

TryFrom NodeUri NodeUriHex Source # 
Instance details

Defined in BtcLsp.Data.Type

TryFrom ByteString SigHeaderName Source # 
Instance details

Defined in BtcLsp.Grpc.Data

TryFrom NodePubKey NodePubKeyHex Source # 
Instance details

Defined in BtcLsp.Data.Type

TryFrom BlockHeight BlkHeight Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

tryFrom :: BlockHeight -> Either (TryFromException BlockHeight BlkHeight) BlkHeight

TryFrom Integer (Vout 'Funding) Source # 
Instance details

Defined in BtcLsp.Data.Orphan

ToBackendKey SqlBackend a => TryFrom Natural (Key a) Source # 
Instance details

Defined in BtcLsp.Data.Orphan

TryFrom Rational (Money owner btcl mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

tryFrom :: Rational -> Either (TryFromException Rational (Money owner btcl mrel)) (Money owner btcl mrel)

TryFrom Natural (Money owner btcl mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

tryFrom :: Natural -> Either (TryFromException Natural (Money owner btcl mrel)) (Money owner btcl mrel)

ToBackendKey SqlBackend a => TryFrom (Key a) Natural Source # 
Instance details

Defined in BtcLsp.Data.Orphan

TryFrom (Ratio Natural) (Money owner btcl mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

tryFrom :: Ratio Natural -> Either (TryFromException (Ratio Natural) (Money owner btcl mrel)) (Money owner btcl mrel)

data TryFromException source target #

Constructors

TryFromException source (Maybe SomeException) 

Instances

Instances details
(Show source, Typeable source, Typeable target) => Exception (TryFromException source target) 
Instance details

Defined in Witch.TryFromException

(Show source, Typeable source, Typeable target) => Show (TryFromException source target) 
Instance details

Defined in Witch.TryFromException

Methods

showsPrec :: Int -> TryFromException source target -> ShowS #

show :: TryFromException source target -> String #

showList :: [TryFromException source target] -> ShowS #

from :: forall source target. (From source target, 'False ~ (source == target)) => source -> target Source #

into :: forall target source. (From source target, 'False ~ (source == target)) => source -> target Source #

via :: forall through source target. (From source through, From through target, 'False ~ (source == through), 'False ~ (through == target)) => source -> target Source #

tryFrom :: forall source target. (TryFrom source target, 'False ~ (source == target)) => source -> Either (TryFromException source target) target Source #

tryVia :: forall through source target. (TryFrom source through, TryFrom through target, 'False ~ (source == through), 'False ~ (through == target)) => source -> Either (TryFromException source target) target Source #

composeTry :: forall through source target. ('False ~ (source == through), 'False ~ (through == target)) => (through -> Either (TryFromException through target) target) -> (source -> Either (TryFromException source through) through) -> source -> Either (TryFromException source target) target Source #

composeTryRhs :: forall through source target. ('False ~ (source == through), 'False ~ (through == target)) => (through -> target) -> (source -> Either (TryFromException source through) through) -> source -> Either (TryFromException source target) target Source #

composeTryLhs :: forall through source target. ('False ~ (source == through), 'False ~ (through == target)) => (through -> Either (TryFromException through target) target) -> (source -> through) -> source -> Either (TryFromException source target) target Source #

decodeMessage :: Message msg => ByteString -> Either String msg #

encodeMessage :: Message msg => msg -> ByteString #

defMessage :: Message msg => msg #

spawnLink :: MonadUnliftIO m => m a -> m (Async a) #

withSpawnLink :: MonadUnliftIO m => m a -> (Async a -> m b) -> m b #

data TxKind #

Constructors

Funding 
Closing 

Instances

Instances details
Show TxKind 
Instance details

Defined in LndClient.Data.Kind

Eq TxKind 
Instance details

Defined in LndClient.Data.Kind

Methods

(==) :: TxKind -> TxKind -> Bool #

(/=) :: TxKind -> TxKind -> Bool #

newtype ChanId #

Constructors

ChanId Word64 

Instances

Instances details
Out ChanId 
Instance details

Defined in LndClient.Data.Newtype

Methods

docPrec :: Int -> ChanId -> Doc #

doc :: ChanId -> Doc #

docList :: [ChanId] -> Doc #

Generic ChanId 
Instance details

Defined in LndClient.Data.Newtype

Associated Types

type Rep ChanId :: Type -> Type #

Methods

from :: ChanId -> Rep ChanId x #

to :: Rep ChanId x -> ChanId #

Read ChanId 
Instance details

Defined in LndClient.Data.Newtype

Show ChanId 
Instance details

Defined in LndClient.Data.Newtype

Eq ChanId 
Instance details

Defined in LndClient.Data.Newtype

Methods

(==) :: ChanId -> ChanId -> Bool #

(/=) :: ChanId -> ChanId -> Bool #

Ord ChanId 
Instance details

Defined in LndClient.Data.Newtype

PersistField ChanId 
Instance details

Defined in LndClient.Data.Newtype

PersistFieldSql ChanId 
Instance details

Defined in LndClient.Data.Newtype

FromGrpc ChanId Word64 
Instance details

Defined in LndClient.Data.Newtype

ToGrpc ChanId Word64 
Instance details

Defined in LndClient.Data.Newtype

SymbolToField "extId" LnChan (Maybe ChanId) Source # 
Instance details

Defined in BtcLsp.Storage.Model

type Rep ChanId 
Instance details

Defined in LndClient.Data.Newtype

type Rep ChanId = D1 ('MetaData "ChanId" "LndClient.Data.Newtype" "lnd-client-0.1.0.0-inplace" 'True) (C1 ('MetaCons "ChanId" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word64)))

newtype MSat #

Constructors

MSat Word64 

Instances

Instances details
Out MSat 
Instance details

Defined in LndClient.Data.Newtype

Methods

docPrec :: Int -> MSat -> Doc #

doc :: MSat -> Doc #

docList :: [MSat] -> Doc #

FromJSON MSat 
Instance details

Defined in LndClient.Data.Newtype

Generic MSat 
Instance details

Defined in LndClient.Data.Newtype

Associated Types

type Rep MSat :: Type -> Type #

Methods

from :: MSat -> Rep MSat x #

to :: Rep MSat x -> MSat #

Num MSat 
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 #

Read MSat 
Instance details

Defined in LndClient.Data.Newtype

Show MSat 
Instance details

Defined in LndClient.Data.Newtype

Methods

showsPrec :: Int -> MSat -> ShowS #

show :: MSat -> String #

showList :: [MSat] -> ShowS #

Eq MSat 
Instance details

Defined in LndClient.Data.Newtype

Methods

(==) :: MSat -> MSat -> Bool #

(/=) :: MSat -> MSat -> Bool #

Ord MSat 
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 #

PersistField MSat 
Instance details

Defined in LndClient.Data.Newtype

PersistFieldSql MSat 
Instance details

Defined in LndClient.Data.Newtype

Methods

sqlType :: Proxy MSat -> SqlType #

ToMessage MSat Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Methods

toMessage :: MSat -> Text #

From Word64 MSat Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Methods

from :: Word64 -> MSat

From FundMoney MSat Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

Methods

from :: FundMoney -> MSat

From Msat MSat Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

Methods

from :: Msat -> MSat

From MSat Word64 Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Methods

from :: MSat -> Word64

From MSat FundMoney Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

Methods

from :: MSat -> FundMoney

From MSat Msat Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

Methods

from :: MSat -> Msat

SymbolToField "totalSatoshisReceived" LnChan MSat Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "totalSatoshisSent" LnChan MSat Source # 
Instance details

Defined in BtcLsp.Storage.Model

From MSat (Money owner btcl mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: MSat -> Money owner btcl mrel

From (Money owner btcl mrel) MSat Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Money owner btcl mrel -> MSat

type Rep MSat 
Instance details

Defined in LndClient.Data.Newtype

type Rep MSat = D1 ('MetaData "MSat" "LndClient.Data.Newtype" "lnd-client-0.1.0.0-inplace" 'True) (C1 ('MetaCons "MSat" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word64)))

newtype NodePubKey #

Constructors

NodePubKey ByteString 

Instances

Instances details
Out NodePubKey 
Instance details

Defined in LndClient.Data.Newtype

Generic NodePubKey 
Instance details

Defined in LndClient.Data.Newtype

Associated Types

type Rep NodePubKey :: Type -> Type #

Read NodePubKey 
Instance details

Defined in LndClient.Data.Newtype

Show NodePubKey 
Instance details

Defined in LndClient.Data.Newtype

Eq NodePubKey 
Instance details

Defined in LndClient.Data.Newtype

Ord NodePubKey 
Instance details

Defined in LndClient.Data.Newtype

PersistField NodePubKey 
Instance details

Defined in LndClient.Data.Newtype

PersistFieldSql NodePubKey 
Instance details

Defined in LndClient.Data.Newtype

FromGrpc NodePubKey ByteString 
Instance details

Defined in LndClient.Data.Newtype

FromGrpc NodePubKey Text 
Instance details

Defined in LndClient.Data.Newtype

ToGrpc NodePubKey ByteString 
Instance details

Defined in LndClient.Data.Newtype

ToGrpc NodePubKey Text 
Instance details

Defined in LndClient.Data.Newtype

From LnPubKey NodePubKey Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

Methods

from :: LnPubKey -> NodePubKey

From NodePubKey LnPubKey Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

Methods

from :: NodePubKey -> LnPubKey

TryFrom NodePubKey NodePubKeyHex Source # 
Instance details

Defined in BtcLsp.Data.Type

SymbolToField "nodePubKey" User NodePubKey Source # 
Instance details

Defined in BtcLsp.Storage.Model

type Rep NodePubKey 
Instance details

Defined in LndClient.Data.Newtype

type Rep NodePubKey = D1 ('MetaData "NodePubKey" "LndClient.Data.Newtype" "lnd-client-0.1.0.0-inplace" 'True) (C1 ('MetaCons "NodePubKey" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ByteString)))

newtype RHash #

Constructors

RHash ByteString 

Instances

Instances details
Out RHash 
Instance details

Defined in LndClient.Data.Newtype

Methods

docPrec :: Int -> RHash -> Doc #

doc :: RHash -> Doc #

docList :: [RHash] -> Doc #

Generic RHash 
Instance details

Defined in LndClient.Data.Newtype

Associated Types

type Rep RHash :: Type -> Type #

Methods

from :: RHash -> Rep RHash x #

to :: Rep RHash x -> RHash #

Show RHash 
Instance details

Defined in LndClient.Data.Newtype

Methods

showsPrec :: Int -> RHash -> ShowS #

show :: RHash -> String #

showList :: [RHash] -> ShowS #

Eq RHash 
Instance details

Defined in LndClient.Data.Newtype

Methods

(==) :: RHash -> RHash -> Bool #

(/=) :: RHash -> RHash -> Bool #

Ord RHash 
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 #

PersistField RHash 
Instance details

Defined in LndClient.Data.Newtype

PersistFieldSql RHash 
Instance details

Defined in LndClient.Data.Newtype

Methods

sqlType :: Proxy RHash -> SqlType #

FromGrpc RHash ByteString 
Instance details

Defined in LndClient.Data.Newtype

FromGrpc RHash Text 
Instance details

Defined in LndClient.Data.Newtype

ToGrpc RHash ByteString 
Instance details

Defined in LndClient.Data.Newtype

ToGrpc RHash CancelInvoiceMsg 
Instance details

Defined in LndClient.Data.Newtype

Methods

toGrpc :: RHash -> Either LndError CancelInvoiceMsg

ToGrpc RHash SubscribeSingleInvoiceRequest 
Instance details

Defined in LndClient.Data.Newtype

Methods

toGrpc :: RHash -> Either LndError SubscribeSingleInvoiceRequest

ToGrpc RHash PaymentHash 
Instance details

Defined in LndClient.Data.Newtype

Methods

toGrpc :: RHash -> Either LndError PaymentHash

From RHashHex RHash Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: RHashHex -> RHash

From RHash RHashHex Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: RHash -> RHashHex

type Rep RHash 
Instance details

Defined in LndClient.Data.Newtype

type Rep RHash = D1 ('MetaData "RHash" "LndClient.Data.Newtype" "lnd-client-0.1.0.0-inplace" 'True) (C1 ('MetaCons "RHash" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ByteString)))

newtype RPreimage #

Constructors

RPreimage ByteString 

Instances

Instances details
Out RPreimage 
Instance details

Defined in LndClient.Data.Newtype

Methods

docPrec :: Int -> RPreimage -> Doc #

doc :: RPreimage -> Doc #

docList :: [RPreimage] -> Doc #

Generic RPreimage 
Instance details

Defined in LndClient.Data.Newtype

Associated Types

type Rep RPreimage :: Type -> Type #

Show RPreimage 
Instance details

Defined in LndClient.Data.Newtype

Eq RPreimage 
Instance details

Defined in LndClient.Data.Newtype

Ord RPreimage 
Instance details

Defined in LndClient.Data.Newtype

PersistField RPreimage 
Instance details

Defined in LndClient.Data.Newtype

PersistFieldSql RPreimage 
Instance details

Defined in LndClient.Data.Newtype

FromGrpc RPreimage ByteString 
Instance details

Defined in LndClient.Data.Newtype

FromGrpc RPreimage Text 
Instance details

Defined in LndClient.Data.Newtype

ToGrpc RPreimage ByteString 
Instance details

Defined in LndClient.Data.Newtype

ToGrpc RPreimage SettleInvoiceMsg 
Instance details

Defined in LndClient.Data.Newtype

Methods

toGrpc :: RPreimage -> Either LndError SettleInvoiceMsg

type Rep RPreimage 
Instance details

Defined in LndClient.Data.Newtype

type Rep RPreimage = D1 ('MetaData "RPreimage" "LndClient.Data.Newtype" "lnd-client-0.1.0.0-inplace" 'True) (C1 ('MetaCons "RPreimage" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ByteString)))

newtype TxId (a :: TxKind) #

Constructors

TxId ByteString 

Instances

Instances details
SymbolToField "closingTxId" LnChan (Maybe (TxId 'Closing)) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "fundingTxId" LnChan (TxId 'Funding) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "refundTxId" SwapUtxo (Maybe (TxId 'Funding)) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "txid" SwapUtxo (TxId 'Funding) Source # 
Instance details

Defined in BtcLsp.Storage.Model

From ByteString (TxId 'Funding) Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Methods

from :: ByteString -> TxId 'Funding

Out (TxId a) 
Instance details

Defined in LndClient.Data.Newtype

Methods

docPrec :: Int -> TxId a -> Doc #

doc :: TxId a -> Doc #

docList :: [TxId a] -> Doc #

Generic (TxId a) 
Instance details

Defined in LndClient.Data.Newtype

Associated Types

type Rep (TxId a) :: Type -> Type #

Methods

from :: TxId a -> Rep (TxId a) x #

to :: Rep (TxId a) x -> TxId a #

Read (TxId a) 
Instance details

Defined in LndClient.Data.Newtype

Show (TxId a) 
Instance details

Defined in LndClient.Data.Newtype

Methods

showsPrec :: Int -> TxId a -> ShowS #

show :: TxId a -> String #

showList :: [TxId a] -> ShowS #

Eq (TxId a) 
Instance details

Defined in LndClient.Data.Newtype

Methods

(==) :: TxId a -> TxId a -> Bool #

(/=) :: TxId a -> TxId a -> Bool #

Ord (TxId a) 
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 #

PersistField (TxId a) 
Instance details

Defined in LndClient.Data.Newtype

PersistFieldSql (TxId a) 
Instance details

Defined in LndClient.Data.Newtype

Methods

sqlType :: Proxy (TxId a) -> SqlType #

FromGrpc (TxId a) ByteString 
Instance details

Defined in LndClient.Data.Newtype

FromGrpc (TxId a) Text 
Instance details

Defined in LndClient.Data.Newtype

Methods

fromGrpc :: Text -> Either LndError (TxId a)

ToGrpc (TxId a) ByteString 
Instance details

Defined in LndClient.Data.Newtype

type Rep (TxId a) 
Instance details

Defined in LndClient.Data.Newtype

type Rep (TxId a) = D1 ('MetaData "TxId" "LndClient.Data.Newtype" "lnd-client-0.1.0.0-inplace" 'True) (C1 ('MetaCons "TxId" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ByteString)))

newtype Vout (a :: TxKind) #

Constructors

Vout Word32 

Instances

Instances details
SymbolToField "fundingVout" LnChan (Vout 'Funding) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "vout" SwapUtxo (Vout 'Funding) Source # 
Instance details

Defined in BtcLsp.Storage.Model

From Word32 (Vout 'Funding) Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Methods

from :: Word32 -> Vout 'Funding

TryFrom Integer (Vout 'Funding) Source # 
Instance details

Defined in BtcLsp.Data.Orphan

Out (Vout a) 
Instance details

Defined in LndClient.Data.Newtype

Methods

docPrec :: Int -> Vout a -> Doc #

doc :: Vout a -> Doc #

docList :: [Vout a] -> Doc #

Generic (Vout a) 
Instance details

Defined in LndClient.Data.Newtype

Associated Types

type Rep (Vout a) :: Type -> Type #

Methods

from :: Vout a -> Rep (Vout a) x #

to :: Rep (Vout a) x -> Vout a #

Read (Vout a) 
Instance details

Defined in LndClient.Data.Newtype

Show (Vout a) 
Instance details

Defined in LndClient.Data.Newtype

Methods

showsPrec :: Int -> Vout a -> ShowS #

show :: Vout a -> String #

showList :: [Vout a] -> ShowS #

Eq (Vout a) 
Instance details

Defined in LndClient.Data.Newtype

Methods

(==) :: Vout a -> Vout a -> Bool #

(/=) :: Vout a -> Vout a -> Bool #

Ord (Vout a) 
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 #

PersistField (Vout a) 
Instance details

Defined in LndClient.Data.Newtype

PersistFieldSql (Vout a) 
Instance details

Defined in LndClient.Data.Newtype

Methods

sqlType :: Proxy (Vout a) -> SqlType #

FromGrpc (Vout a) Word32 
Instance details

Defined in LndClient.Data.Newtype

ToGrpc (Vout a) Word32 
Instance details

Defined in LndClient.Data.Newtype

type Rep (Vout a) 
Instance details

Defined in LndClient.Data.Newtype

type Rep (Vout a) = D1 ('MetaData "Vout" "LndClient.Data.Newtype" "lnd-client-0.1.0.0-inplace" 'True) (C1 ('MetaCons "Vout" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word32)))

data LndError #

Instances

Instances details
Out LndError 
Instance details

Defined in LndClient.Data.Type

Methods

docPrec :: Int -> LndError -> Doc #

doc :: LndError -> Doc #

docList :: [LndError] -> Doc #

Exception LndError 
Instance details

Defined in LndClient.Data.Type

Generic LndError 
Instance details

Defined in LndClient.Data.Type

Associated Types

type Rep LndError :: Type -> Type #

Methods

from :: LndError -> Rep LndError x #

to :: Rep LndError x -> LndError #

Show LndError 
Instance details

Defined in LndClient.Data.Type

Eq LndError 
Instance details

Defined in LndClient.Data.Type

type Rep LndError 
Instance details

Defined in LndClient.Data.Type

type Rep LndError = D1 ('MetaData "LndError" "LndClient.Data.Type" "lnd-client-0.1.0.0-inplace" 'False) (((C1 ('MetaCons "ToGrpcError" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text)) :+: (C1 ('MetaCons "FromGrpcError" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text)) :+: C1 ('MetaCons "LndGrpcError" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedUnpack) (Rec0 ClientError)))) :+: (C1 ('MetaCons "LndGrpcException" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text)) :+: (C1 ('MetaCons "LndWalletLocked" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LndWalletNotExists" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "GrpcUnexpectedResult" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text)) :+: (C1 ('MetaCons "GrpcEmptyResult" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LndError" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text)))) :+: ((C1 ('MetaCons "LndEnvError" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text)) :+: C1 ('MetaCons "TChanTimeout" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text))) :+: (C1 ('MetaCons "NetworkException" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text)) :+: C1 ('MetaCons "LndIOException" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 IOException))))))

data CompressMode #

Constructors

Compressed 
Uncompressed 

Instances

Instances details
FromJSON CompressMode Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

Generic CompressMode Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

Associated Types

type Rep CompressMode :: Type -> Type #

Eq CompressMode Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

type Rep CompressMode Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

type Rep CompressMode = D1 ('MetaData "CompressMode" "Network.GRPC.Client" "http2-client-grpc-0.8.0.0-inplace" 'False) (C1 ('MetaCons "Compressed" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Uncompressed" 'PrefixI 'False) (U1 :: Type -> Type))

inspect :: Out a => a -> Text #

inspectGenPlain :: (Out a, IsString b) => a -> b #

inspectPlain :: Out a => a -> Text #

inspectStr :: Out a => a -> String #

data PrettyLog a #

Constructors

PrettyLog a 
SecretLog SecretVision a 

Instances

Instances details
Out a => Out (PrettyLog a) 
Instance details

Defined in Text.PrettyPrint.GenericPretty.Type

Methods

docPrec :: Int -> PrettyLog a -> Doc #

doc :: PrettyLog a -> Doc #

docList :: [PrettyLog a] -> Doc #

Eq a => Eq (PrettyLog a) 
Instance details

Defined in Text.PrettyPrint.GenericPretty.Type

Methods

(==) :: PrettyLog a -> PrettyLog a -> Bool #

(/=) :: PrettyLog a -> PrettyLog a -> Bool #

Ord a => Ord (PrettyLog a) 
Instance details

Defined in Text.PrettyPrint.GenericPretty.Type

data SecretVision #

Instances

Instances details
Out SecretVision 
Instance details

Defined in Text.PrettyPrint.GenericPretty.Type

Generic SecretVision 
Instance details

Defined in Text.PrettyPrint.GenericPretty.Type

Associated Types

type Rep SecretVision :: Type -> Type #

Read SecretVision 
Instance details

Defined in Text.PrettyPrint.GenericPretty.Type

Show SecretVision 
Instance details

Defined in Text.PrettyPrint.GenericPretty.Type

Eq SecretVision 
Instance details

Defined in Text.PrettyPrint.GenericPretty.Type

Ord SecretVision 
Instance details

Defined in Text.PrettyPrint.GenericPretty.Type

type Rep SecretVision 
Instance details

Defined in Text.PrettyPrint.GenericPretty.Type

type Rep SecretVision = D1 ('MetaData "SecretVision" "Text.PrettyPrint.GenericPretty.Type" "generic-pretty-instances-0.1.0.0-inplace" 'False) (C1 ('MetaCons "SecretVisible" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "SecretHidden" 'PrefixI 'False) (U1 :: Type -> Type))