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

BtcLsp.Yesod.Import.NoFoundation

Synopsis

Documentation

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.

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

Extract the first component of a pair.

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

Extract the second component of a pair.

otherwise :: Bool #

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

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

assert :: Bool -> a -> a #

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

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

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

log :: a -> a #

sqrt :: a -> a #

(**) :: a -> a -> a infixr 8 #

logBase :: a -> a -> a #

sin :: a -> a #

cos :: a -> a #

tan :: a -> a #

asin :: a -> a #

acos :: a -> a #

atan :: a -> a #

sinh :: a -> a #

cosh :: a -> a #

tanh :: a -> a #

asinh :: a -> a #

acosh :: a -> a #

atanh :: a -> a #

Instances

Instances details
Floating CDouble 
Instance details

Defined in Foreign.C.Types

Floating CFloat 
Instance details

Defined in Foreign.C.Types

Floating Double

Since: base-2.1

Instance details

Defined in GHC.Float

Floating Float

Since: base-2.1

Instance details

Defined in GHC.Float

RealFloat a => Floating (Complex a)

Since: base-2.1

Instance details

Defined in Data.Complex

Methods

pi :: Complex a #

exp :: Complex a -> Complex a #

log :: Complex a -> Complex a #

sqrt :: Complex a -> Complex a #

(**) :: Complex a -> Complex a -> Complex a #

logBase :: Complex a -> Complex a -> Complex a #

sin :: Complex a -> Complex a #

cos :: Complex a -> Complex a #

tan :: Complex a -> Complex a #

asin :: Complex a -> Complex a #

acos :: Complex a -> Complex a #

atan :: Complex a -> Complex a #

sinh :: Complex a -> Complex a #

cosh :: Complex a -> Complex a #

tanh :: Complex a -> Complex a #

asinh :: Complex a -> Complex a #

acosh :: Complex a -> Complex a #

atanh :: Complex a -> Complex a #

log1p :: Complex a -> Complex a #

expm1 :: Complex a -> Complex a #

log1pexp :: Complex a -> Complex a #

log1mexp :: Complex a -> Complex a #

Floating a => Floating (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Floating a => Floating (Down a)

Since: base-4.14.0.0

Instance details

Defined in Data.Ord

Methods

pi :: Down a #

exp :: Down a -> Down a #

log :: Down a -> Down a #

sqrt :: Down a -> Down a #

(**) :: Down a -> Down a -> Down a #

logBase :: Down a -> Down a -> Down a #

sin :: Down a -> Down a #

cos :: Down a -> Down a #

tan :: Down a -> Down a #

asin :: Down a -> Down a #

acos :: Down a -> Down a #

atan :: Down a -> Down a #

sinh :: Down a -> Down a #

cosh :: Down a -> Down a #

tanh :: Down a -> Down a #

asinh :: Down a -> Down a #

acosh :: Down a -> Down a #

atanh :: Down a -> Down a #

log1p :: Down a -> Down a #

expm1 :: Down a -> Down a #

log1pexp :: Down a -> Down a #

log1mexp :: Down a -> Down a #

Floating a => Floating (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 (RealFrac a, Floating a) => RealFloat a where #

Efficient, machine-independent access to the components of a floating-point number.

Methods

floatRadix :: a -> Integer #

a constant function, returning the radix of the representation (often 2)

floatDigits :: a -> Int #

a constant function, returning the number of digits of floatRadix in the significand

floatRange :: a -> (Int, Int) #

a constant function, returning the lowest and highest values the exponent may assume

decodeFloat :: a -> (Integer, Int) #

The function decodeFloat applied to a real floating-point number returns the significand expressed as an Integer and an appropriately scaled exponent (an Int). If decodeFloat x yields (m,n), then x is equal in value to m*b^^n, where b is the floating-point radix, and furthermore, either m and n are both zero or else b^(d-1) <= abs m < b^d, where d is the value of floatDigits x. In particular, decodeFloat 0 = (0,0). If the type contains a negative zero, also decodeFloat (-0.0) = (0,0). The result of decodeFloat x is unspecified if either of isNaN x or isInfinite x is True.

encodeFloat :: Integer -> Int -> a #

encodeFloat performs the inverse of decodeFloat in the sense that for finite x with the exception of -0.0, uncurry encodeFloat (decodeFloat x) = x. encodeFloat m n is one of the two closest representable floating-point numbers to m*b^^n (or ±Infinity if overflow occurs); usually the closer, but if m contains too many bits, the result may be rounded in the wrong direction.

exponent :: a -> Int #

exponent corresponds to the second component of decodeFloat. exponent 0 = 0 and for finite nonzero x, exponent x = snd (decodeFloat x) + floatDigits x. If x is a finite floating-point number, it is equal in value to significand x * b ^^ exponent x, where b is the floating-point radix. The behaviour is unspecified on infinite or NaN values.

significand :: a -> a #

The first component of decodeFloat, scaled to lie in the open interval (-1,1), either 0.0 or of absolute value >= 1/b, where b is the floating-point radix. The behaviour is unspecified on infinite or NaN values.

scaleFloat :: Int -> a -> a #

multiplies a floating-point number by an integer power of the radix

isNaN :: a -> Bool #

True if the argument is an IEEE "not-a-number" (NaN) value

isInfinite :: a -> Bool #

True if the argument is an IEEE infinity or negative infinity

isDenormalized :: a -> Bool #

True if the argument is too small to be represented in normalized format

isNegativeZero :: a -> Bool #

True if the argument is an IEEE negative zero

isIEEE :: a -> Bool #

True if the argument is an IEEE floating point number

atan2 :: a -> a -> a #

a version of arctangent taking two real floating-point arguments. For real floating x and y, atan2 y x computes the angle (from the positive x-axis) of the vector from the origin to the point (x,y). atan2 y x returns a value in the range [-pi, pi]. It follows the Common Lisp semantics for the origin when signed zeroes are supported. atan2 y 1, with y in a type that is RealFloat, should return the same value as atan y. A default definition of atan2 is provided, but implementors can provide a more accurate implementation.

Instances

Instances details
RealFloat CDouble 
Instance details

Defined in Foreign.C.Types

RealFloat CFloat 
Instance details

Defined in Foreign.C.Types

RealFloat Double

Since: base-2.1

Instance details

Defined in GHC.Float

RealFloat Float

Since: base-2.1

Instance details

Defined in GHC.Float

RealFloat a => RealFloat (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

RealFloat a => RealFloat (Down a)

Since: base-4.14.0.0

Instance details

Defined in Data.Ord

RealFloat a => RealFloat (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

floatRadix :: Const a b -> Integer #

floatDigits :: Const a b -> Int #

floatRange :: Const a b -> (Int, Int) #

decodeFloat :: Const a b -> (Integer, Int) #

encodeFloat :: Integer -> Int -> Const a b #

exponent :: Const a b -> Int #

significand :: Const a b -> Const a b #

scaleFloat :: Int -> Const a b -> Const a b #

isNaN :: Const a b -> Bool #

isInfinite :: Const a b -> Bool #

isDenormalized :: Const a b -> Bool #

isNegativeZero :: Const a b -> Bool #

isIEEE :: Const a b -> Bool #

atan2 :: Const a b -> Const a b -> Const a b #

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

Defined in Data.Tagged

Methods

floatRadix :: Tagged s a -> Integer #

floatDigits :: Tagged s a -> Int #

floatRange :: Tagged s a -> (Int, Int) #

decodeFloat :: Tagged s a -> (Integer, Int) #

encodeFloat :: Integer -> Int -> Tagged s a #

exponent :: Tagged s a -> Int #

significand :: Tagged s a -> Tagged s a #

scaleFloat :: Int -> Tagged s a -> Tagged s a #

isNaN :: Tagged s a -> Bool #

isInfinite :: Tagged s a -> Bool #

isDenormalized :: Tagged s a -> Bool #

isNegativeZero :: Tagged s a -> Bool #

isIEEE :: Tagged s a -> Bool #

atan2 :: Tagged s a -> Tagged s a -> Tagged s a #

class (Real a, Fractional a) => RealFrac a where #

Extracting components of fractions.

Minimal complete definition

properFraction

Methods

properFraction :: Integral b => a -> (b, a) #

The function properFraction takes a real fractional number x and returns a pair (n,f) such that x = n+f, and:

  • n is an integral number with the same sign as x; and
  • f is a fraction with the same type and sign as x, and with absolute value less than 1.

The default definitions of the ceiling, floor, truncate and round functions are in terms of properFraction.

truncate :: Integral b => a -> b #

truncate x returns the integer nearest x between zero and x

round :: Integral b => a -> b #

round x returns the nearest integer to x; the even integer if x is equidistant between two integers

ceiling :: Integral b => a -> b #

ceiling x returns the least integer not less than x

floor :: Integral b => a -> b #

floor x returns the greatest integer not greater than x

Instances

Instances details
RealFrac CDouble 
Instance details

Defined in Foreign.C.Types

Methods

properFraction :: Integral b => CDouble -> (b, CDouble) #

truncate :: Integral b => CDouble -> b #

round :: Integral b => CDouble -> b #

ceiling :: Integral b => CDouble -> b #

floor :: Integral b => CDouble -> b #

RealFrac CFloat 
Instance details

Defined in Foreign.C.Types

Methods

properFraction :: Integral b => CFloat -> (b, CFloat) #

truncate :: Integral b => CFloat -> b #

round :: Integral b => CFloat -> b #

ceiling :: Integral b => CFloat -> b #

floor :: Integral b => CFloat -> b #

RealFrac Scientific

WARNING: the methods of the RealFrac instance need to compute the magnitude 10^e. If applied to a huge exponent this could take a long time. Even worse, when the destination type is unbounded (i.e. Integer) it could fill up all space and crash your program!

Instance details

Defined in Data.Scientific

RealFrac DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Methods

properFraction :: Integral b => DiffTime -> (b, DiffTime) #

truncate :: Integral b => DiffTime -> b #

round :: Integral b => DiffTime -> b #

ceiling :: Integral b => DiffTime -> b #

floor :: Integral b => DiffTime -> b #

RealFrac 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 where #

Conversion of values to readable Strings.

Derived instances of Show have the following properties, which are compatible with derived instances of Read:

  • The result of show is a syntactically correct Haskell expression containing only constants, given the fixity declarations in force at the point where the type is declared. It contains only the constructor names defined in the data type, parentheses, and spaces. When labelled constructor fields are used, braces, commas, field names, and equal signs are also used.
  • If the constructor is defined to be an infix operator, then showsPrec will produce infix applications of the constructor.
  • the representation will be enclosed in parentheses if the precedence of the top-level constructor in x is less than d (associativity is ignored). Thus, if d is 0 then the result is never surrounded in parentheses; if d is 11 it is always surrounded in parentheses, unless it is an atomic expression.
  • If the constructor is defined using record syntax, then show will produce the record-syntax form, with the fields given in the same order as the original declaration.

For example, given the declarations

infixr 5 :^:
data Tree a =  Leaf a  |  Tree a :^: Tree a

the derived instance of Show is equivalent to

instance (Show a) => Show (Tree a) where

       showsPrec d (Leaf m) = showParen (d > app_prec) $
            showString "Leaf " . showsPrec (app_prec+1) m
         where app_prec = 10

       showsPrec d (u :^: v) = showParen (d > up_prec) $
            showsPrec (up_prec+1) u .
            showString " :^: "      .
            showsPrec (up_prec+1) v
         where up_prec = 5

Note that right-associativity of :^: is ignored. For example,

  • show (Leaf 1 :^: Leaf 2 :^: Leaf 3) produces the string "Leaf 1 :^: (Leaf 2 :^: Leaf 3)".

Minimal complete definition

showsPrec | show

Methods

showsPrec #

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

-> ShowS 

Convert a value to a readable String.

showsPrec should satisfy the law

showsPrec d x r ++ s  ==  showsPrec d x (r ++ s)

Derived instances of Read and Show satisfy the following:

That is, readsPrec parses the string produced by showsPrec, and delivers the value that showsPrec started with.

show :: a -> String #

A specialised variant of showsPrec, using precedence context zero, and returning an ordinary String.

showList :: [a] -> ShowS #

The method showList is provided to allow the programmer to give a specialised way of showing lists of values. For example, this is used by the predefined Show instance of the Char type, where values of type String should be shown in double quotes, rather than between square brackets.

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

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.

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

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

RealWorld is deeply magical. It is primitive, but it is not unlifted (hence ptrArg). We never manipulate values of type RealWorld; it's only used in the type system, to parameterise State#.

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

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

error :: forall (r :: RuntimeRep) (a :: TYPE r). HasCallStack => [Char] -> a #

error stops execution and displays an error message.

liftM :: Monad m => (a1 -> r) -> m a1 -> m r #

Promote a function to a monad.

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.

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

hash :: a -> Int #

Like hashWithSalt, but no salt is used. The default implementation uses hashWithSalt with some default salt. Instances might want to implement this method to provide a more efficient implementation than the default implementation.

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]

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.

Constructors

UTCTime 

Fields

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

A type that can be converted to JSON.

Instances in general must specify toJSON and should (but don't need to) specify toEncoding.

An example type and instance:

-- Allow ourselves to write Text literals.
{-# LANGUAGE OverloadedStrings #-}

data Coord = Coord { x :: Double, y :: Double }

instance ToJSON Coord where
  toJSON (Coord x y) = object ["x" .= x, "y" .= y]

  toEncoding (Coord x y) = pairs ("x" .= x <> "y" .= y)

Instead of manually writing your ToJSON instance, there are two options to do it automatically:

  • Data.Aeson.TH provides Template Haskell functions which will derive an instance at compile time. The generated instance is optimized for your type so it will probably be more efficient than the following option.
  • The compiler can provide a default generic implementation for toJSON.

To use the second, simply add a deriving Generic clause to your datatype and declare a ToJSON instance. If you require nothing other than defaultOptions, it is sufficient to write (and this is the only alternative where the default toJSON implementation is sufficient):

{-# LANGUAGE DeriveGeneric #-}

import GHC.Generics

data Coord = Coord { x :: Double, y :: Double } deriving Generic

instance ToJSON Coord where
    toEncoding = genericToEncoding defaultOptions

If on the other hand you wish to customize the generic decoding, you have to implement both methods:

customOptions = defaultOptions
                { fieldLabelModifier = map toUpper
                }

instance ToJSON Coord where
    toJSON     = genericToJSON customOptions
    toEncoding = genericToEncoding customOptions

Previous versions of this library only had the toJSON method. Adding toEncoding had two reasons:

  1. toEncoding is more efficient for the common case that the output of toJSON is directly serialized to a ByteString. Further, expressing either method in terms of the other would be non-optimal.
  2. The choice of defaults allows a smooth transition for existing users: Existing instances that do not define toEncoding still compile and have the correct semantics. This is ensured by making the default implementation of toEncoding use toJSON. This produces correct results, but since it performs an intermediate conversion to a Value, it will be less efficient than directly emitting an Encoding. (this also means that specifying nothing more than instance ToJSON Coord would be sufficient as a generically decoding instance, but there probably exists no good reason to not specify toEncoding in new instances.)

Minimal complete definition

Nothing

Methods

toJSON :: a -> Value #

Convert a Haskell value to a JSON-friendly intermediate type.

toEncoding :: a -> Encoding #

Encode a Haskell value as JSON.

The default implementation of this method creates an intermediate Value using toJSON. This provides source-level compatibility for people upgrading from older versions of this library, but obviously offers no performance advantage.

To benefit from direct encoding, you must provide an implementation for this method. The easiest way to do so is by having your types implement Generic using the DeriveGeneric extension, and then have GHC generate a method body as follows.

instance ToJSON Coord where
    toEncoding = genericToEncoding defaultOptions

toJSONList :: [a] -> Value #

toEncodingList :: [a] -> Encoding #

Instances

Instances details
ToJSON 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 #

(.=) :: (KeyValue kv, ToJSON v) => Text -> v -> kv infixr 8 #

(.:) :: FromJSON a => Object -> Text -> Parser a #

Retrieve the value associated with the given key of an Object. The result is empty if the key is not present or the value cannot be converted to the desired type.

This accessor is appropriate if the key and value must be present in an object for it to be valid. If the key and value are optional, use .:? instead.

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

object :: [Pair] -> Value #

Create a Value from a list of name/value Pairs. If duplicate keys arise, earlier keys and their associated values win.

data Value #

A JSON value represented as a Haskell value.

Instances

Instances details
FromJSON Value 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromString Encoding 
Instance details

Defined in Data.Aeson.Types.ToJSON

FromString Value 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

fromString :: String -> Value

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

Defined in Data.Aeson.Types.ToJSON

Data Value 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Value -> c Value #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Value #

toConstr :: Value -> Constr #

dataTypeOf :: Value -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Value) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Value) #

gmapT :: (forall b. Data b => b -> b) -> Value -> Value #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Value -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Value -> r #

gmapQ :: (forall d. Data d => d -> u) -> Value -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Value -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Value -> m Value #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Value -> m Value #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Value -> m Value #

IsString Value 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fromString :: String -> Value #

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 #

Read Value 
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 #

NFData Value 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

rnf :: Value -> () #

Eq Value 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

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

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

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 #

Hashable Value 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

hashWithSalt :: Int -> Value -> Int #

hash :: Value -> Int #

ToObject Object 
Instance details

Defined in Katip.Core

Methods

toObject :: Object -> Object #

ToJavascript Value 
Instance details

Defined in Text.Julius

HasContentType Encoding 
Instance details

Defined in Yesod.Core.Content

HasContentType Value 
Instance details

Defined in Yesod.Core.Content

Methods

getContentType :: Monad m => m Value -> ContentType #

ToContent Encoding 
Instance details

Defined in Yesod.Core.Content

ToContent Value 
Instance details

Defined in Yesod.Core.Content

Methods

toContent :: Value -> Content #

ToTypedContent Encoding 
Instance details

Defined in Yesod.Core.Content

ToTypedContent Value 
Instance details

Defined in Yesod.Core.Content

Lift Value 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

lift :: Quote m => Value -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Value -> Code m Value #

GToJSON' Encoding arity (U1 :: Type -> Type) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

gToJSON :: Options -> ToArgs Encoding arity a -> U1 a -> Encoding

GToJSON' Value arity (U1 :: Type -> Type) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

gToJSON :: Options -> ToArgs Value arity a -> U1 a -> Value

GToJSON' Value arity (V1 :: Type -> Type) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

gToJSON :: Options -> ToArgs Value arity a -> V1 a -> Value

ToJSON1 f => GToJSON' Encoding One (Rec1 f) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

gToJSON :: Options -> ToArgs Encoding One a -> Rec1 f a -> Encoding

ToJSON1 f => GToJSON' Value One (Rec1 f) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

gToJSON :: Options -> ToArgs Value One a -> Rec1 f a -> Value

(EncodeProduct arity a, EncodeProduct arity b) => GToJSON' Encoding arity (a :*: b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

gToJSON :: Options -> ToArgs Encoding arity a0 -> (a :*: b) a0 -> Encoding

ToJSON a => GToJSON' Encoding arity (K1 i a :: Type -> Type) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

gToJSON :: Options -> ToArgs Encoding arity a0 -> K1 i a a0 -> Encoding

(WriteProduct arity a, WriteProduct arity b, ProductSize a, ProductSize b) => GToJSON' Value arity (a :*: b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

gToJSON :: Options -> ToArgs Value arity a0 -> (a :*: b) a0 -> Value

ToJSON a => GToJSON' Value arity (K1 i a :: Type -> Type) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

gToJSON :: Options -> ToArgs Value arity a0 -> K1 i a a0 -> Value

(ToJSON1 f, GToJSON' Encoding One g) => GToJSON' Encoding One (f :.: g) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

gToJSON :: Options -> ToArgs Encoding One a -> (f :.: g) a -> Encoding

(ToJSON1 f, GToJSON' Value One g) => GToJSON' Value One (f :.: g) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

gToJSON :: Options -> ToArgs Value One a -> (f :.: g) a -> Value

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

(GToJSON' Encoding arity a, ConsToJSON Encoding arity a, Constructor c) => SumToJSON' TwoElemArray Encoding arity (C1 c a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

sumToJSON' :: Options -> ToArgs Encoding arity a0 -> C1 c a a0 -> Tagged TwoElemArray Encoding

(GToJSON' Value arity a, ConsToJSON Value arity a, Constructor c) => SumToJSON' TwoElemArray Value arity (C1 c a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

sumToJSON' :: Options -> ToArgs Value arity a0 -> C1 c a a0 -> Tagged TwoElemArray Value

type Rep Value 
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 #

waitBothSTM :: Async a -> Async b -> STM (a, b) #

A version of waitBoth that can be used inside an STM transaction.

Since: async-2.1.0

waitEitherSTM_ :: Async a -> Async b -> STM () #

A version of waitEither_ that can be used inside an STM transaction.

Since: async-2.1.0

waitEitherSTM :: Async a -> Async b -> STM (Either a b) #

A version of waitEither that can be used inside an STM transaction.

Since: async-2.1.0

waitEitherCatchSTM :: Async a -> Async b -> STM (Either (Either SomeException a) (Either SomeException b)) #

A version of waitEitherCatch that can be used inside an STM transaction.

Since: async-2.1.0

waitAnySTM :: [Async a] -> STM (Async a, a) #

A version of waitAny that can be used inside an STM transaction.

Since: async-2.1.0

waitAnyCatchSTM :: [Async a] -> STM (Async a, Either SomeException a) #

A version of waitAnyCatch that can be used inside an STM transaction.

Since: async-2.1.0

pollSTM :: Async a -> STM (Maybe (Either SomeException a)) #

A version of poll that can be used inside an STM transaction.

waitCatchSTM :: Async a -> STM (Either SomeException a) #

A version of waitCatch that can be used inside an STM transaction.

waitSTM :: Async a -> STM a #

A version of wait that can be used inside an STM transaction.

data Async a #

An asynchronous action spawned by async or withAsync. Asynchronous actions are executed in a separate thread, and operations are provided for waiting for asynchronous actions to complete and obtaining their results (see e.g. wait).

Instances

Instances details
Functor Async 
Instance details

Defined in Control.Concurrent.Async

Methods

fmap :: (a -> b) -> Async a -> Async b #

(<$) :: a -> Async b -> Async a #

Eq (Async a) 
Instance details

Defined in Control.Concurrent.Async

Methods

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

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

Ord (Async a) 
Instance details

Defined in Control.Concurrent.Async

Methods

compare :: Async a -> Async a -> Ordering #

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

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

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

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

max :: Async a -> Async a -> Async a #

min :: Async a -> Async a -> Async a #

Hashable (Async a) 
Instance details

Defined in Control.Concurrent.Async

Methods

hashWithSalt :: Int -> Async a -> Int #

hash :: Async a -> Int #

data AsyncCancelled #

The exception thrown by cancel to terminate a thread.

Constructors

AsyncCancelled 

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 #

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)

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

data Chan a #

Chan is an abstract type representing an unbounded FIFO channel.

Instances

Instances details
Eq (Chan a)

Since: base-4.4.0.0

Instance details

Defined in Control.Concurrent.Chan

Methods

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

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

data QSem #

QSem is a quantity semaphore in which the resource is acquired and released in units of one. It provides guaranteed FIFO ordering for satisfying blocked waitQSem calls.

The pattern

  bracket_ waitQSem signalQSem (...)

is safe; it never loses a unit of the resource.

data QSemN #

QSemN is a quantity semaphore in which the resource is acquired and released in units of one. It provides guaranteed FIFO ordering for satisfying blocked waitQSemN calls.

The pattern

  bracket_ (waitQSemN n) (signalQSemN n) (...)

is safe; it never loses any of the resource.

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 #

unless :: Applicative f => Bool -> f () -> f () #

The reverse of when.

replicateM_ :: Applicative m => Int -> m a -> m () #

Like replicateM, but discards the result.

forever :: Applicative f => f a -> f b #

Repeat an action indefinitely.

Examples

Expand

A common use of forever is to process input from network sockets, Handles, and channels (e.g. MVar and Chan).

For example, here is how we might implement an echo server, using forever both to listen for client connections on a network socket and to echo client input on client connection handles:

echoServer :: Socket -> IO ()
echoServer socket = forever $ do
  client <- accept socket
  forkFinally (echo client) (\_ -> hClose client)
  where
    echo :: Handle -> IO ()
    echo client = forever $
      hGetLine client >>= hPutStrLn client

Note that "forever" isn't necessarily non-terminating. If the action is in a MonadPlus and short-circuits after some number of iterations. then forever actually returns mzero, effectively short-circuiting its caller.

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

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

for :: (Traversable t, Applicative f) => t a -> (a -> f b) -> f (t b) #

for is traverse with its arguments flipped. For a version that ignores the results see for_.

optional :: Alternative f => f a -> f (Maybe a) #

One or none.

It is useful for modelling any computation that is allowed to fail.

Examples

Expand

Using the Alternative instance of 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, b') (c, c') infixr 3 #

Split the input between the two argument arrows and combine their output. Note that this is in general not a functor.

The default definition may be overridden with a more efficient version if desired.

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

userErrorType :: IOErrorType #

I/O error that is programmer-defined.

tryIOError :: IO a -> IO (Either IOError a) #

The construct tryIOError comp exposes IO errors which occur within a computation, and which are not fully handled.

Non-I/O exceptions are not caught by this variant; to catch all exceptions, use try from Control.Exception.

Since: base-4.4.0.0

resourceVanishedErrorType :: IOErrorType #

I/O error where the operation failed because the resource vanished. This happens when, for example, attempting to write to a closed socket or attempting to write to a named pipe that was deleted.

Since: base-4.14.0.0

permissionErrorType :: IOErrorType #

I/O error where the operation failed because the user does not have sufficient operating system privilege to perform that operation.

modifyIOError :: (IOError -> IOError) -> IO a -> IO a #

Catch any IOError that occurs in the computation and throw a modified version.

mkIOError :: IOErrorType -> String -> Maybe Handle -> Maybe FilePath -> IOError #

Construct an IOError of the given type where the second argument describes the error location and the third and fourth argument contain the file handle and file path of the file involved in the error if applicable.

isUserErrorType :: IOErrorType -> Bool #

I/O error that is programmer-defined.

isUserError :: IOError -> Bool #

A programmer-defined error value constructed using userError.

isResourceVanishedErrorType :: IOErrorType -> Bool #

I/O error where the operation failed because the resource vanished. See resourceVanishedErrorType.

Since: base-4.14.0.0

isResourceVanishedError :: IOError -> Bool #

An error indicating that the operation failed because the resource vanished. See resourceVanishedErrorType.

Since: base-4.14.0.0

isPermissionErrorType :: IOErrorType -> Bool #

I/O error where the operation failed because the user does not have sufficient operating system privilege to perform that operation.

isPermissionError :: IOError -> Bool #

An error indicating that an IO operation failed because the user does not have sufficient operating system privilege to perform that operation.

isIllegalOperationErrorType :: IOErrorType -> Bool #

I/O error where the operation is not possible.

isIllegalOperation :: IOError -> Bool #

An error indicating that an IO operation failed because the operation was not possible. Any computation which returns an IO result may fail with isIllegalOperation. In some cases, an implementation will not be able to distinguish between the possible error causes. In this case it should fail with isIllegalOperation.

isFullErrorType :: IOErrorType -> Bool #

I/O error where the operation failed because the device is full.

isFullError :: IOError -> Bool #

An error indicating that an IO operation failed because the device is full.

isEOFErrorType :: IOErrorType -> Bool #

I/O error where the operation failed because the end of file has been reached.

isEOFError :: IOError -> Bool #

An error indicating that an IO operation failed because the end of file has been reached.

isDoesNotExistErrorType :: IOErrorType -> Bool #

I/O error where the operation failed because one of its arguments does not exist.

isDoesNotExistError :: IOError -> Bool #

An error indicating that an IO operation failed because one of its arguments does not exist.

isAlreadyInUseErrorType :: IOErrorType -> Bool #

I/O error where the operation failed because one of its arguments is a single-use resource, which is already being used.

isAlreadyInUseError :: IOError -> Bool #

An error indicating that an IO operation failed because one of its arguments is a single-use resource, which is already being used (for example, opening the same file twice for writing might give this error).

isAlreadyExistsErrorType :: IOErrorType -> Bool #

I/O error where the operation failed because one of its arguments already exists.

isAlreadyExistsError :: IOError -> Bool #

An error indicating that an IO operation failed because one of its arguments already exists.

illegalOperationErrorType :: IOErrorType #

I/O error where the operation is not possible.

fullErrorType :: IOErrorType #

I/O error where the operation failed because the device is full.

eofErrorType :: IOErrorType #

I/O error where the operation failed because the end of file has been reached.

doesNotExistErrorType :: IOErrorType #

I/O error where the operation failed because one of its arguments does not exist.

annotateIOError :: IOError -> String -> Maybe Handle -> Maybe FilePath -> IOError #

Adds a location description and maybe a file path and file handle to an IOError. If any of the file handle or file path is not given the corresponding value in the IOError remains unaltered.

alreadyInUseErrorType :: IOErrorType #

I/O error where the operation failed because one of its arguments is a single-use resource, which is already being used.

alreadyExistsErrorType :: IOErrorType #

I/O error where the operation failed because one of its arguments already exists.

data TVar a #

Shared memory locations that support atomic memory transactions.

Instances

Instances details
Eq (TVar a)

Since: base-4.8.0.0

Instance details

Defined in GHC.Conc.Sync

Methods

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

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

data STM a #

A monad supporting atomic memory transactions.

Instances

Instances details
Alternative STM

Since: base-4.8.0.0

Instance details

Defined in GHC.Conc.Sync

Methods

empty :: STM a #

(<|>) :: STM a -> STM a -> STM a #

some :: STM a -> STM [a] #

many :: STM a -> STM [a] #

Applicative STM

Since: base-4.8.0.0

Instance details

Defined in GHC.Conc.Sync

Methods

pure :: a -> STM a #

(<*>) :: STM (a -> b) -> STM a -> STM b #

liftA2 :: (a -> b -> c) -> STM a -> STM b -> STM c #

(*>) :: STM a -> STM b -> STM b #

(<*) :: STM a -> STM b -> STM a #

Functor STM

Since: base-4.3.0.0

Instance details

Defined in GHC.Conc.Sync

Methods

fmap :: (a -> b) -> STM a -> STM b #

(<$) :: a -> STM b -> STM a #

Monad STM

Since: base-4.3.0.0

Instance details

Defined in GHC.Conc.Sync

Methods

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

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

return :: a -> STM a #

MonadPlus STM

Since: base-4.3.0.0

Instance details

Defined in GHC.Conc.Sync

Methods

mzero :: STM a #

mplus :: STM a -> STM a -> STM a #

MonadCatch STM 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => STM a -> (e -> STM a) -> STM a #

MonadThrow STM 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> STM a #

MonadBaseControl STM STM 
Instance details

Defined in Control.Monad.Trans.Control

Associated Types

type StM STM a #

Methods

liftBaseWith :: (RunInBase STM STM -> STM a) -> STM a #

restoreM :: StM STM a -> STM a #

RandomGen g => FrozenGen (TGen g) STM

Since: random-1.2.1

Instance details

Defined in System.Random.Stateful

Associated Types

type MutableGen (TGen g) STM = (g :: Type) #

Methods

freezeGen :: MutableGen (TGen g) STM -> STM (TGen g) #

thawGen :: TGen g -> STM (MutableGen (TGen g) STM) #

RandomGen g => StatefulGen (TGenM g) STM

Since: random-1.2.1

Instance details

Defined in System.Random.Stateful

RandomGen r => RandomGenM (TGenM r) r STM 
Instance details

Defined in System.Random.Stateful

Methods

applyRandomGenM :: (r -> (a, r)) -> TGenM r -> STM a #

type StM STM a 
Instance details

Defined in Control.Monad.Trans.Control

type StM STM a = a
type MutableGen (TGen g) STM 
Instance details

Defined in System.Random.Stateful

type MutableGen (TGen g) STM = TGenM g

writeTVar :: TVar a -> a -> STM () #

Write the supplied value into a TVar.

readTVar :: TVar a -> STM a #

Return the current value stored in a TVar.

orElse :: STM a -> STM a -> STM a #

Compose two alternative STM actions (GHC only).

If the first action completes without retrying then it forms the result of the orElse. Otherwise, if the first action retries, then the second action is tried in its place. If both actions retry then the orElse as a whole retries.

newTVar :: a -> STM (TVar a) #

Create a new TVar holding a value supplied

data SomeAsyncException #

Superclass for asynchronous exceptions.

Since: base-4.7.0.0

Constructors

Exception e => SomeAsyncException e 

data IOErrorType #

An abstract type that contains a value for each variant of IOError.

Instances

Instances details
Show IOErrorType

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Eq IOErrorType

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

ioError :: IOError -> IO a #

Raise an IOError in the IO monad.

asyncExceptionToException :: Exception e => e -> SomeException #

Since: base-4.7.0.0

data BufferMode #

Three kinds of buffering are supported: line-buffering, block-buffering or no-buffering. These modes have the following effects. For output, items are written out, or flushed, from the internal buffer according to the buffer mode:

  • line-buffering: the entire output buffer is flushed whenever a newline is output, the buffer overflows, a hFlush is issued, or the handle is closed.
  • block-buffering: the entire buffer is written out whenever it overflows, a hFlush is issued, or the handle is closed.
  • no-buffering: output is written immediately, and never stored in the buffer.

An implementation is free to flush the buffer more frequently, but not less frequently, than specified above. The output buffer is emptied as soon as it has been written out.

Similarly, input occurs according to the buffer mode for the handle:

  • line-buffering: when the buffer for the handle is not empty, the next item is obtained from the buffer; otherwise, when the buffer is empty, characters up to and including the next newline character are read into the buffer. No characters are available until the newline character is available or the buffer is full.
  • block-buffering: when the buffer for the handle becomes empty, the next block of data is read into the buffer.
  • no-buffering: the next input item is read and returned. The hLookAhead operation implies that even a no-buffered handle may require a one-character buffer.

The default buffering mode when a handle is opened is implementation-dependent and may depend on the file system object which is attached to that handle. For most implementations, physical files will normally be block-buffered and terminals will normally be line-buffered.

Constructors

NoBuffering

buffering is disabled if possible.

LineBuffering

line-buffering should be enabled if possible.

BlockBuffering (Maybe Int)

block-buffering should be enabled if possible. The size of the buffer is n items if the argument is Just n and is otherwise implementation-dependent.

Instances

Instances details
Read BufferMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Handle.Types

Show BufferMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Handle.Types

Eq BufferMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Handle.Types

Ord BufferMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Handle.Types

data SeekMode #

A mode that determines the effect of hSeek hdl mode i.

Constructors

AbsoluteSeek

the position of hdl is set to i.

RelativeSeek

the position of hdl is set to offset i from the current position.

SeekFromEnd

the position of hdl is set to offset i from the end of the file.

Instances

Instances details
Enum SeekMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Device

Ix SeekMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Device

Read SeekMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Device

Show SeekMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Device

Eq SeekMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Device

Ord SeekMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Device

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

data IOException #

Exceptions that occur in the IO monad. An IOException records a more specific error type, a descriptive string and maybe the handle that was used when the error was flagged.

Instances

Instances details
Exception IOException

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Show IOException

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Eq IOException

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Error IOException 
Instance details

Defined in Control.Monad.Trans.Error

MonadError IOException IO 
Instance details

Defined in Control.Monad.Error.Class

Methods

throwError :: IOException -> IO a #

catchError :: IO a -> (IOException -> IO a) -> IO a #

type IOError = IOException #

The Haskell 2010 type for exceptions in the IO monad. Any I/O operation may raise an IOError instead of returning a result. For a more general type of exception, including also those that arise in pure code, see Exception.

In Haskell 2010, this is an opaque type.

userError :: String -> IOError #

Construct an IOError value with a string describing the error. The fail method of the IO instance of the Monad class raises a userError, thus:

instance Monad IO where
  ...
  fail s = ioError (userError s)

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

asum :: (Foldable t, Alternative f) => t (f a) -> f a #

The sum of a collection of actions, generalizing concat.

asum is just like msum, but generalised to Alternative.

Examples

Expand

Basic usage:

>>> asum [Just "Hello", Nothing, Just "World"]
Just "Hello"

newtype Down a #

The Down type allows you to reverse sort order conveniently. A value of type Down a contains a value of type a (represented as Down a).

If a has an Ord instance associated with it then comparing two values thus wrapped will give you the opposite of their normal sort order. This is particularly useful when sorting in generalised list comprehensions, as in: then sortWith by Down x.

>>> compare True False
GT
>>> compare (Down True) (Down False)
LT

If a has a Bounded instance then the wrapped instance also respects the reversed ordering by exchanging the values of minBound and maxBound.

>>> minBound :: Int
-9223372036854775808
>>> minBound :: Down Int
Down 9223372036854775807

All other instances of Down a behave as they do for a.

Since: base-4.6.0.0

Constructors

Down 

Fields

Instances

Instances details
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) ...

class Storable a #

The member functions of this class facilitate writing values of primitive types to raw memory (which may have been allocated with the above mentioned routines) and reading values from blocks of raw memory. The class, furthermore, includes support for computing the storage requirements and alignment restrictions of storable types.

Memory addresses are represented as values of type Ptr a, for some a which is an instance of class Storable. The type argument to Ptr helps provide some valuable type safety in FFI code (you can't mix pointers of different types without an explicit cast), while helping the Haskell type system figure out which marshalling method is needed for a given pointer.

All marshalling between Haskell and a foreign language ultimately boils down to translating Haskell data structures into the binary representation of a corresponding data structure of the foreign language and vice versa. To code this marshalling in Haskell, it is necessary to manipulate primitive data types stored in unstructured memory blocks. The class Storable facilitates this manipulation on all types for which it is instantiated, which are the standard basic types of Haskell, the fixed size Int types (Int8, Int16, Int32, Int64), the fixed size Word types (Word8, Word16, Word32, Word64), StablePtr, all types from Foreign.C.Types, as well as Ptr.

Minimal complete definition

sizeOf, alignment, (peek | peekElemOff | peekByteOff), (poke | pokeElemOff | pokeByteOff)

Instances

Instances details
Storable CBool 
Instance details

Defined in Foreign.C.Types

Methods

sizeOf :: CBool -> Int #

alignment :: CBool -> Int #

peekElemOff :: Ptr CBool -> Int -> IO CBool #

pokeElemOff :: Ptr CBool -> Int -> CBool -> IO () #

peekByteOff :: Ptr b -> Int -> IO CBool #

pokeByteOff :: Ptr b -> Int -> CBool -> IO () #

peek :: Ptr CBool -> IO CBool #

poke :: Ptr CBool -> CBool -> IO () #

Storable CChar 
Instance details

Defined in Foreign.C.Types

Methods

sizeOf :: CChar -> Int #

alignment :: CChar -> Int #

peekElemOff :: Ptr CChar -> Int -> IO CChar #

pokeElemOff :: Ptr CChar -> Int -> CChar -> IO () #

peekByteOff :: Ptr b -> Int -> IO CChar #

pokeByteOff :: Ptr b -> Int -> CChar -> IO () #

peek :: Ptr CChar -> IO CChar #

poke :: Ptr CChar -> CChar -> IO () #

Storable CClock 
Instance details

Defined in Foreign.C.Types

Storable CDouble 
Instance details

Defined in Foreign.C.Types

Storable CFloat 
Instance details

Defined in Foreign.C.Types

Storable CInt 
Instance details

Defined in Foreign.C.Types

Methods

sizeOf :: CInt -> Int #

alignment :: CInt -> Int #

peekElemOff :: Ptr CInt -> Int -> IO CInt #

pokeElemOff :: Ptr CInt -> Int -> CInt -> IO () #

peekByteOff :: Ptr b -> Int -> IO CInt #

pokeByteOff :: Ptr b -> Int -> CInt -> IO () #

peek :: Ptr CInt -> IO CInt #

poke :: Ptr CInt -> CInt -> IO () #

Storable CIntMax 
Instance details

Defined in Foreign.C.Types

Storable CIntPtr 
Instance details

Defined in Foreign.C.Types

Storable CLLong 
Instance details

Defined in Foreign.C.Types

Storable CLong 
Instance details

Defined in Foreign.C.Types

Methods

sizeOf :: CLong -> Int #

alignment :: CLong -> Int #

peekElemOff :: Ptr CLong -> Int -> IO CLong #

pokeElemOff :: Ptr CLong -> Int -> CLong -> IO () #

peekByteOff :: Ptr b -> Int -> IO CLong #

pokeByteOff :: Ptr b -> Int -> CLong -> IO () #

peek :: Ptr CLong -> IO CLong #

poke :: Ptr CLong -> CLong -> IO () #

Storable CPtrdiff 
Instance details

Defined in Foreign.C.Types

Storable CSChar 
Instance details

Defined in Foreign.C.Types

Storable CSUSeconds 
Instance details

Defined in Foreign.C.Types

Storable CShort 
Instance details

Defined in Foreign.C.Types

Storable CSigAtomic 
Instance details

Defined in Foreign.C.Types

Storable CSize 
Instance details

Defined in Foreign.C.Types

Methods

sizeOf :: CSize -> Int #

alignment :: CSize -> Int #

peekElemOff :: Ptr CSize -> Int -> IO CSize #

pokeElemOff :: Ptr CSize -> Int -> CSize -> IO () #

peekByteOff :: Ptr b -> Int -> IO CSize #

pokeByteOff :: Ptr b -> Int -> CSize -> IO () #

peek :: Ptr CSize -> IO CSize #

poke :: Ptr CSize -> CSize -> IO () #

Storable CTime 
Instance details

Defined in Foreign.C.Types

Methods

sizeOf :: CTime -> Int #

alignment :: CTime -> Int #

peekElemOff :: Ptr CTime -> Int -> IO CTime #

pokeElemOff :: Ptr CTime -> Int -> CTime -> IO () #

peekByteOff :: Ptr b -> Int -> IO CTime #

pokeByteOff :: Ptr b -> Int -> CTime -> IO () #

peek :: Ptr CTime -> IO CTime #

poke :: Ptr CTime -> CTime -> IO () #

Storable CUChar 
Instance details

Defined in Foreign.C.Types

Storable CUInt 
Instance details

Defined in Foreign.C.Types

Methods

sizeOf :: CUInt -> Int #

alignment :: CUInt -> Int #

peekElemOff :: Ptr CUInt -> Int -> IO CUInt #

pokeElemOff :: Ptr CUInt -> Int -> CUInt -> IO () #

peekByteOff :: Ptr b -> Int -> IO CUInt #

pokeByteOff :: Ptr b -> Int -> CUInt -> IO () #

peek :: Ptr CUInt -> IO CUInt #

poke :: Ptr CUInt -> CUInt -> IO () #

Storable CUIntMax 
Instance details

Defined in Foreign.C.Types

Storable CUIntPtr 
Instance details

Defined in Foreign.C.Types

Storable CULLong 
Instance details

Defined in Foreign.C.Types

Storable CULong 
Instance details

Defined in Foreign.C.Types

Storable CUSeconds 
Instance details

Defined in Foreign.C.Types

Storable CUShort 
Instance details

Defined in Foreign.C.Types

Storable CWchar 
Instance details

Defined in Foreign.C.Types

Storable Fingerprint

Since: base-4.4.0.0

Instance details

Defined in Foreign.Storable

Storable Int16

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Int16 -> Int #

alignment :: Int16 -> Int #

peekElemOff :: Ptr Int16 -> Int -> IO Int16 #

pokeElemOff :: Ptr Int16 -> Int -> Int16 -> IO () #

peekByteOff :: Ptr b -> Int -> IO Int16 #

pokeByteOff :: Ptr b -> Int -> Int16 -> IO () #

peek :: Ptr Int16 -> IO Int16 #

poke :: Ptr Int16 -> Int16 -> IO () #

Storable Int32

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Int32 -> Int #

alignment :: Int32 -> Int #

peekElemOff :: Ptr Int32 -> Int -> IO Int32 #

pokeElemOff :: Ptr Int32 -> Int -> Int32 -> IO () #

peekByteOff :: Ptr b -> Int -> IO Int32 #

pokeByteOff :: Ptr b -> Int -> Int32 -> IO () #

peek :: Ptr Int32 -> IO Int32 #

poke :: Ptr Int32 -> Int32 -> IO () #

Storable Int64

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Int64 -> Int #

alignment :: Int64 -> Int #

peekElemOff :: Ptr Int64 -> Int -> IO Int64 #

pokeElemOff :: Ptr Int64 -> Int -> Int64 -> IO () #

peekByteOff :: Ptr b -> Int -> IO Int64 #

pokeByteOff :: Ptr b -> Int -> Int64 -> IO () #

peek :: Ptr Int64 -> IO Int64 #

poke :: Ptr Int64 -> Int64 -> IO () #

Storable Int8

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Int8 -> Int #

alignment :: Int8 -> Int #

peekElemOff :: Ptr Int8 -> Int -> IO Int8 #

pokeElemOff :: Ptr Int8 -> Int -> Int8 -> IO () #

peekByteOff :: Ptr b -> Int -> IO Int8 #

pokeByteOff :: Ptr b -> Int -> Int8 -> IO () #

peek :: Ptr Int8 -> IO Int8 #

poke :: Ptr Int8 -> Int8 -> IO () #

Storable IoSubSystem

Since: base-4.9.0.0

Instance details

Defined in GHC.RTS.Flags

Storable Word16

Since: base-2.1

Instance details

Defined in Foreign.Storable

Storable Word32

Since: base-2.1

Instance details

Defined in Foreign.Storable

Storable Word64

Since: base-2.1

Instance details

Defined in Foreign.Storable

Storable CBlkCnt 
Instance details

Defined in System.Posix.Types

Storable CBlkSize 
Instance details

Defined in System.Posix.Types

Storable CCc 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: CCc -> Int #

alignment :: CCc -> Int #

peekElemOff :: Ptr CCc -> Int -> IO CCc #

pokeElemOff :: Ptr CCc -> Int -> CCc -> IO () #

peekByteOff :: Ptr b -> Int -> IO CCc #

pokeByteOff :: Ptr b -> Int -> CCc -> IO () #

peek :: Ptr CCc -> IO CCc #

poke :: Ptr CCc -> CCc -> IO () #

Storable CClockId 
Instance details

Defined in System.Posix.Types

Storable CDev 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: CDev -> Int #

alignment :: CDev -> Int #

peekElemOff :: Ptr CDev -> Int -> IO CDev #

pokeElemOff :: Ptr CDev -> Int -> CDev -> IO () #

peekByteOff :: Ptr b -> Int -> IO CDev #

pokeByteOff :: Ptr b -> Int -> CDev -> IO () #

peek :: Ptr CDev -> IO CDev #

poke :: Ptr CDev -> CDev -> IO () #

Storable CFsBlkCnt 
Instance details

Defined in System.Posix.Types

Storable CFsFilCnt 
Instance details

Defined in System.Posix.Types

Storable CGid 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: CGid -> Int #

alignment :: CGid -> Int #

peekElemOff :: Ptr CGid -> Int -> IO CGid #

pokeElemOff :: Ptr CGid -> Int -> CGid -> IO () #

peekByteOff :: Ptr b -> Int -> IO CGid #

pokeByteOff :: Ptr b -> Int -> CGid -> IO () #

peek :: Ptr CGid -> IO CGid #

poke :: Ptr CGid -> CGid -> IO () #

Storable CId 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: CId -> Int #

alignment :: CId -> Int #

peekElemOff :: Ptr CId -> Int -> IO CId #

pokeElemOff :: Ptr CId -> Int -> CId -> IO () #

peekByteOff :: Ptr b -> Int -> IO CId #

pokeByteOff :: Ptr b -> Int -> CId -> IO () #

peek :: Ptr CId -> IO CId #

poke :: Ptr CId -> CId -> IO () #

Storable CIno 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: CIno -> Int #

alignment :: CIno -> Int #

peekElemOff :: Ptr CIno -> Int -> IO CIno #

pokeElemOff :: Ptr CIno -> Int -> CIno -> IO () #

peekByteOff :: Ptr b -> Int -> IO CIno #

pokeByteOff :: Ptr b -> Int -> CIno -> IO () #

peek :: Ptr CIno -> IO CIno #

poke :: Ptr CIno -> CIno -> IO () #

Storable CKey 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: CKey -> Int #

alignment :: CKey -> Int #

peekElemOff :: Ptr CKey -> Int -> IO CKey #

pokeElemOff :: Ptr CKey -> Int -> CKey -> IO () #

peekByteOff :: Ptr b -> Int -> IO CKey #

pokeByteOff :: Ptr b -> Int -> CKey -> IO () #

peek :: Ptr CKey -> IO CKey #

poke :: Ptr CKey -> CKey -> IO () #

Storable CMode 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: CMode -> Int #

alignment :: CMode -> Int #

peekElemOff :: Ptr CMode -> Int -> IO CMode #

pokeElemOff :: Ptr CMode -> Int -> CMode -> IO () #

peekByteOff :: Ptr b -> Int -> IO CMode #

pokeByteOff :: Ptr b -> Int -> CMode -> IO () #

peek :: Ptr CMode -> IO CMode #

poke :: Ptr CMode -> CMode -> IO () #

Storable CNfds 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: CNfds -> Int #

alignment :: CNfds -> Int #

peekElemOff :: Ptr CNfds -> Int -> IO CNfds #

pokeElemOff :: Ptr CNfds -> Int -> CNfds -> IO () #

peekByteOff :: Ptr b -> Int -> IO CNfds #

pokeByteOff :: Ptr b -> Int -> CNfds -> IO () #

peek :: Ptr CNfds -> IO CNfds #

poke :: Ptr CNfds -> CNfds -> IO () #

Storable CNlink 
Instance details

Defined in System.Posix.Types

Storable COff 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: COff -> Int #

alignment :: COff -> Int #

peekElemOff :: Ptr COff -> Int -> IO COff #

pokeElemOff :: Ptr COff -> Int -> COff -> IO () #

peekByteOff :: Ptr b -> Int -> IO COff #

pokeByteOff :: Ptr b -> Int -> COff -> IO () #

peek :: Ptr COff -> IO COff #

poke :: Ptr COff -> COff -> IO () #

Storable CPid 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: CPid -> Int #

alignment :: CPid -> Int #

peekElemOff :: Ptr CPid -> Int -> IO CPid #

pokeElemOff :: Ptr CPid -> Int -> CPid -> IO () #

peekByteOff :: Ptr b -> Int -> IO CPid #

pokeByteOff :: Ptr b -> Int -> CPid -> IO () #

peek :: Ptr CPid -> IO CPid #

poke :: Ptr CPid -> CPid -> IO () #

Storable CRLim 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: CRLim -> Int #

alignment :: CRLim -> Int #

peekElemOff :: Ptr CRLim -> Int -> IO CRLim #

pokeElemOff :: Ptr CRLim -> Int -> CRLim -> IO () #

peekByteOff :: Ptr b -> Int -> IO CRLim #

pokeByteOff :: Ptr b -> Int -> CRLim -> IO () #

peek :: Ptr CRLim -> IO CRLim #

poke :: Ptr CRLim -> CRLim -> IO () #

Storable CSocklen 
Instance details

Defined in System.Posix.Types

Storable CSpeed 
Instance details

Defined in System.Posix.Types

Storable CSsize 
Instance details

Defined in System.Posix.Types

Storable CTcflag 
Instance details

Defined in System.Posix.Types

Storable CTimer 
Instance details

Defined in System.Posix.Types

Storable CUid 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: CUid -> Int #

alignment :: CUid -> Int #

peekElemOff :: Ptr CUid -> Int -> IO CUid #

pokeElemOff :: Ptr CUid -> Int -> CUid -> IO () #

peekByteOff :: Ptr b -> Int -> IO CUid #

pokeByteOff :: Ptr b -> Int -> CUid -> IO () #

peek :: Ptr CUid -> IO CUid #

poke :: Ptr CUid -> CUid -> IO () #

Storable Fd 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: Fd -> Int #

alignment :: Fd -> Int #

peekElemOff :: Ptr Fd -> Int -> IO Fd #

pokeElemOff :: Ptr Fd -> Int -> Fd -> IO () #

peekByteOff :: Ptr b -> Int -> IO Fd #

pokeByteOff :: Ptr b -> Int -> Fd -> IO () #

peek :: Ptr Fd -> IO Fd #

poke :: Ptr Fd -> Fd -> IO () #

Storable Day 
Instance details

Defined in Chronos

Methods

sizeOf :: Day -> Int #

alignment :: Day -> Int #

peekElemOff :: Ptr Day -> Int -> IO Day #

pokeElemOff :: Ptr Day -> Int -> Day -> IO () #

peekByteOff :: Ptr b -> Int -> IO Day #

pokeByteOff :: Ptr b -> Int -> Day -> IO () #

peek :: Ptr Day -> IO Day #

poke :: Ptr Day -> Day -> IO () #

Storable Time 
Instance details

Defined in Chronos

Methods

sizeOf :: Time -> Int #

alignment :: Time -> Int #

peekElemOff :: Ptr Time -> Int -> IO Time #

pokeElemOff :: Ptr Time -> Int -> Time -> IO () #

peekByteOff :: Ptr b -> Int -> IO Time #

pokeByteOff :: Ptr b -> Int -> Time -> IO () #

peek :: Ptr Time -> IO Time #

poke :: Ptr Time -> Time -> IO () #

Storable TimeSpec 
Instance details

Defined in System.Clock

Storable AddrInfo 
Instance details

Defined in Network.Socket.Info

Storable In6Addr 
Instance details

Defined in Network.Socket.Types

Methods

sizeOf :: In6Addr -> Int #

alignment :: In6Addr -> Int #

peekElemOff :: Ptr In6Addr -> Int -> IO In6Addr #

pokeElemOff :: Ptr In6Addr -> Int -> In6Addr -> IO () #

peekByteOff :: Ptr b -> Int -> IO In6Addr #

pokeByteOff :: Ptr b -> Int -> In6Addr -> IO () #

peek :: Ptr In6Addr -> IO In6Addr #

poke :: Ptr In6Addr -> In6Addr -> IO () #

Storable PortNumber 
Instance details

Defined in Network.Socket.Types

Storable CodePoint 
Instance details

Defined in Data.Text.Encoding

Methods

sizeOf :: CodePoint -> Int #

alignment :: CodePoint -> Int #

peekElemOff :: Ptr CodePoint -> Int -> IO CodePoint #

pokeElemOff :: Ptr CodePoint -> Int -> CodePoint -> IO () #

peekByteOff :: Ptr b -> Int -> IO CodePoint #

pokeByteOff :: Ptr b -> Int -> CodePoint -> IO () #

peek :: Ptr CodePoint -> IO CodePoint #

poke :: Ptr CodePoint -> CodePoint -> IO () #

Storable DecoderState 
Instance details

Defined in Data.Text.Encoding

Methods

sizeOf :: DecoderState -> Int #

alignment :: DecoderState -> Int #

peekElemOff :: Ptr DecoderState -> Int -> IO DecoderState #

pokeElemOff :: Ptr DecoderState -> Int -> DecoderState -> IO () #

peekByteOff :: Ptr b -> Int -> IO DecoderState #

pokeByteOff :: Ptr b -> Int -> DecoderState -> IO () #

peek :: Ptr DecoderState -> IO DecoderState #

poke :: Ptr DecoderState -> DecoderState -> IO () #

Storable UUID

This Storable instance uses the memory layout as described in RFC 4122, but in contrast to the Binary instance, the fields are stored in host byte order.

Instance details

Defined in Data.UUID.Types.Internal

Methods

sizeOf :: UUID -> Int #

alignment :: UUID -> Int #

peekElemOff :: Ptr UUID -> Int -> IO UUID #

pokeElemOff :: Ptr UUID -> Int -> UUID -> IO () #

peekByteOff :: Ptr b -> Int -> IO UUID #

pokeByteOff :: Ptr b -> Int -> UUID -> IO () #

peek :: Ptr UUID -> IO UUID #

poke :: Ptr UUID -> UUID -> IO () #

Storable Int128 
Instance details

Defined in Data.WideWord.Int128

Storable Word128 
Instance details

Defined in Data.WideWord.Word128

Storable Word256 
Instance details

Defined in Data.WideWord.Word256

Storable Word8

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Word8 -> Int #

alignment :: Word8 -> Int #

peekElemOff :: Ptr Word8 -> Int -> IO Word8 #

pokeElemOff :: Ptr Word8 -> Int -> Word8 -> IO () #

peekByteOff :: Ptr b -> Int -> IO Word8 #

pokeByteOff :: Ptr b -> Int -> Word8 -> IO () #

peek :: Ptr Word8 -> IO Word8 #

poke :: Ptr Word8 -> Word8 -> IO () #

Storable ()

Since: base-4.9.0.0

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: () -> Int #

alignment :: () -> Int #

peekElemOff :: Ptr () -> Int -> IO () #

pokeElemOff :: Ptr () -> Int -> () -> IO () #

peekByteOff :: Ptr b -> Int -> IO () #

pokeByteOff :: Ptr b -> Int -> () -> IO () #

peek :: Ptr () -> IO () #

poke :: Ptr () -> () -> IO () #

Storable Bool

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Bool -> Int #

alignment :: Bool -> Int #

peekElemOff :: Ptr Bool -> Int -> IO Bool #

pokeElemOff :: Ptr Bool -> Int -> Bool -> IO () #

peekByteOff :: Ptr b -> Int -> IO Bool #

pokeByteOff :: Ptr b -> Int -> Bool -> IO () #

peek :: Ptr Bool -> IO Bool #

poke :: Ptr Bool -> Bool -> IO () #

Storable Char

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Char -> Int #

alignment :: Char -> Int #

peekElemOff :: Ptr Char -> Int -> IO Char #

pokeElemOff :: Ptr Char -> Int -> Char -> IO () #

peekByteOff :: Ptr b -> Int -> IO Char #

pokeByteOff :: Ptr b -> Int -> Char -> IO () #

peek :: Ptr Char -> IO Char #

poke :: Ptr Char -> Char -> IO () #

Storable Double

Since: base-2.1

Instance details

Defined in Foreign.Storable

Storable Float

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Float -> Int #

alignment :: Float -> Int #

peekElemOff :: Ptr Float -> Int -> IO Float #

pokeElemOff :: Ptr Float -> Int -> Float -> IO () #

peekByteOff :: Ptr b -> Int -> IO Float #

pokeByteOff :: Ptr b -> Int -> Float -> IO () #

peek :: Ptr Float -> IO Float #

poke :: Ptr Float -> Float -> IO () #

Storable Int

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Int -> Int #

alignment :: Int -> Int #

peekElemOff :: Ptr Int -> Int -> IO Int #

pokeElemOff :: Ptr Int -> Int -> Int -> IO () #

peekByteOff :: Ptr b -> Int -> IO Int #

pokeByteOff :: Ptr b -> Int -> Int -> IO () #

peek :: Ptr Int -> IO Int #

poke :: Ptr Int -> Int -> IO () #

Storable Word

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Word -> Int #

alignment :: Word -> Int #

peekElemOff :: Ptr Word -> Int -> IO Word #

pokeElemOff :: Ptr Word -> Int -> Word -> IO () #

peekByteOff :: Ptr b -> Int -> IO Word #

pokeByteOff :: Ptr b -> Int -> Word -> IO () #

peek :: Ptr Word -> IO Word #

poke :: Ptr Word -> Word -> IO () #

Storable a => Storable (Complex a)

Since: base-4.8.0.0

Instance details

Defined in Data.Complex

Methods

sizeOf :: Complex a -> Int #

alignment :: Complex a -> Int #

peekElemOff :: Ptr (Complex a) -> Int -> IO (Complex a) #

pokeElemOff :: Ptr (Complex a) -> Int -> Complex a -> IO () #

peekByteOff :: Ptr b -> Int -> IO (Complex a) #

pokeByteOff :: Ptr b -> Int -> Complex a -> IO () #

peek :: Ptr (Complex a) -> IO (Complex a) #

poke :: Ptr (Complex a) -> Complex a -> IO () #

Storable a => Storable (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

sizeOf :: Identity a -> Int #

alignment :: Identity a -> Int #

peekElemOff :: Ptr (Identity a) -> Int -> IO (Identity a) #

pokeElemOff :: Ptr (Identity a) -> Int -> Identity a -> IO () #

peekByteOff :: Ptr b -> Int -> IO (Identity a) #

pokeByteOff :: Ptr b -> Int -> Identity a -> IO () #

peek :: Ptr (Identity a) -> IO (Identity a) #

poke :: Ptr (Identity a) -> Identity a -> IO () #

Storable a => Storable (Down a)

Since: base-4.14.0.0

Instance details

Defined in Data.Ord

Methods

sizeOf :: Down a -> Int #

alignment :: Down a -> Int #

peekElemOff :: Ptr (Down a) -> Int -> IO (Down a) #

pokeElemOff :: Ptr (Down a) -> Int -> Down a -> IO () #

peekByteOff :: Ptr b -> Int -> IO (Down a) #

pokeByteOff :: Ptr b -> Int -> Down a -> IO () #

peek :: Ptr (Down a) -> IO (Down a) #

poke :: Ptr (Down a) -> Down a -> IO () #

Storable (FunPtr a)

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: FunPtr a -> Int #

alignment :: FunPtr a -> Int #

peekElemOff :: Ptr (FunPtr a) -> Int -> IO (FunPtr a) #

pokeElemOff :: Ptr (FunPtr a) -> Int -> FunPtr a -> IO () #

peekByteOff :: Ptr b -> Int -> IO (FunPtr a) #

pokeByteOff :: Ptr b -> Int -> FunPtr a -> IO () #

peek :: Ptr (FunPtr a) -> IO (FunPtr a) #

poke :: Ptr (FunPtr a) -> FunPtr a -> IO () #

Storable (Ptr a)

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Ptr a -> Int #

alignment :: Ptr a -> Int #

peekElemOff :: Ptr (Ptr a) -> Int -> IO (Ptr a) #

pokeElemOff :: Ptr (Ptr a) -> Int -> Ptr a -> IO () #

peekByteOff :: Ptr b -> Int -> IO (Ptr a) #

pokeByteOff :: Ptr b -> Int -> Ptr a -> IO () #

peek :: Ptr (Ptr a) -> IO (Ptr a) #

poke :: Ptr (Ptr a) -> Ptr a -> IO () #

(Storable a, Integral a) => Storable (Ratio a)

Since: base-4.8.0.0

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Ratio a -> Int #

alignment :: Ratio a -> Int #

peekElemOff :: Ptr (Ratio a) -> Int -> IO (Ratio a) #

pokeElemOff :: Ptr (Ratio a) -> Int -> Ratio a -> IO () #

peekByteOff :: Ptr b -> Int -> IO (Ratio a) #

pokeByteOff :: Ptr b -> Int -> Ratio a -> IO () #

peek :: Ptr (Ratio a) -> IO (Ratio a) #

poke :: Ptr (Ratio a) -> Ratio a -> IO () #

Storable (StablePtr a)

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: StablePtr a -> Int #

alignment :: StablePtr a -> Int #

peekElemOff :: Ptr (StablePtr a) -> Int -> IO (StablePtr a) #

pokeElemOff :: Ptr (StablePtr a) -> Int -> StablePtr a -> IO () #

peekByteOff :: Ptr b -> Int -> IO (StablePtr a) #

pokeByteOff :: Ptr b -> Int -> StablePtr a -> IO () #

peek :: Ptr (StablePtr a) -> IO (StablePtr a) #

poke :: Ptr (StablePtr a) -> StablePtr a -> IO () #

Prim a => Storable (PrimStorable a) 
Instance details

Defined in Data.Primitive.Types

Storable g => Storable (StateGen g) 
Instance details

Defined in System.Random.Internal

Methods

sizeOf :: StateGen g -> Int #

alignment :: StateGen g -> Int #

peekElemOff :: Ptr (StateGen g) -> Int -> IO (StateGen g) #

pokeElemOff :: Ptr (StateGen g) -> Int -> StateGen g -> IO () #

peekByteOff :: Ptr b -> Int -> IO (StateGen g) #

pokeByteOff :: Ptr b -> Int -> StateGen g -> IO () #

peek :: Ptr (StateGen g) -> IO (StateGen g) #

poke :: Ptr (StateGen g) -> StateGen g -> IO () #

Storable g => Storable (AtomicGen g) 
Instance details

Defined in System.Random.Stateful

Methods

sizeOf :: AtomicGen g -> Int #

alignment :: AtomicGen g -> Int #

peekElemOff :: Ptr (AtomicGen g) -> Int -> IO (AtomicGen g) #

pokeElemOff :: Ptr (AtomicGen g) -> Int -> AtomicGen g -> IO () #

peekByteOff :: Ptr b -> Int -> IO (AtomicGen g) #

pokeByteOff :: Ptr b -> Int -> AtomicGen g -> IO () #

peek :: Ptr (AtomicGen g) -> IO (AtomicGen g) #

poke :: Ptr (AtomicGen g) -> AtomicGen g -> IO () #

Storable g => Storable (IOGen g) 
Instance details

Defined in System.Random.Stateful

Methods

sizeOf :: IOGen g -> Int #

alignment :: IOGen g -> Int #

peekElemOff :: Ptr (IOGen g) -> Int -> IO (IOGen g) #

pokeElemOff :: Ptr (IOGen g) -> Int -> IOGen g -> IO () #

peekByteOff :: Ptr b -> Int -> IO (IOGen g) #

pokeByteOff :: Ptr b -> Int -> IOGen g -> IO () #

peek :: Ptr (IOGen g) -> IO (IOGen g) #

poke :: Ptr (IOGen g) -> IOGen g -> IO () #

Storable g => Storable (STGen g) 
Instance details

Defined in System.Random.Stateful

Methods

sizeOf :: STGen g -> Int #

alignment :: STGen g -> Int #

peekElemOff :: Ptr (STGen g) -> Int -> IO (STGen g) #

pokeElemOff :: Ptr (STGen g) -> Int -> STGen g -> IO () #

peekByteOff :: Ptr b -> Int -> IO (STGen g) #

pokeByteOff :: Ptr b -> Int -> STGen g -> IO () #

peek :: Ptr (STGen g) -> IO (STGen g) #

poke :: Ptr (STGen g) -> STGen g -> IO () #

Storable g => Storable (TGen g) 
Instance details

Defined in System.Random.Stateful

Methods

sizeOf :: TGen g -> Int #

alignment :: TGen g -> Int #

peekElemOff :: Ptr (TGen g) -> Int -> IO (TGen g) #

pokeElemOff :: Ptr (TGen g) -> Int -> TGen g -> IO () #

peekByteOff :: Ptr b -> Int -> IO (TGen g) #

pokeByteOff :: Ptr b -> Int -> TGen g -> IO () #

peek :: Ptr (TGen g) -> IO (TGen g) #

poke :: Ptr (TGen g) -> TGen g -> IO () #

Storable a => Storable (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

sizeOf :: Const a b -> Int #

alignment :: Const a b -> Int #

peekElemOff :: Ptr (Const a b) -> Int -> IO (Const a b) #

pokeElemOff :: Ptr (Const a b) -> Int -> Const a b -> IO () #

peekByteOff :: Ptr b0 -> Int -> IO (Const a b) #

pokeByteOff :: Ptr b0 -> Int -> Const a b -> IO () #

peek :: Ptr (Const a b) -> IO (Const a b) #

poke :: Ptr (Const a b) -> Const a b -> IO () #

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

Defined in Data.Tagged

Methods

sizeOf :: Tagged s a -> Int #

alignment :: Tagged s a -> Int #

peekElemOff :: Ptr (Tagged s a) -> Int -> IO (Tagged s a) #

pokeElemOff :: Ptr (Tagged s a) -> Int -> Tagged s a -> IO () #

peekByteOff :: Ptr b -> Int -> IO (Tagged s a) #

pokeByteOff :: Ptr b -> Int -> Tagged s a -> IO () #

peek :: Ptr (Tagged s a) -> IO (Tagged s a) #

poke :: Ptr (Tagged s a) -> Tagged s a -> IO () #

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

id :: forall (a :: k). Category cat => cat a a #

the identity morphism

(.) :: forall (b :: k) (c :: k) (a :: k). Category cat => cat b c -> cat a b -> cat a c infixr 9 #

morphism composition

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

odd :: Integral a => a -> Bool #

even :: Integral a => a -> Bool #

(^^) :: (Fractional a, Integral b) => a -> b -> a infixr 8 #

raise a number to an integral power

(^) :: (Num a, Integral b) => a -> b -> a infixr 8 #

raise a number to a non-negative integral power

(%) :: Integral a => a -> a -> Ratio a infixl 7 #

Forms the ratio of two integral numbers.

data STRef s a #

a value of type STRef s a is a mutable variable in state thread s, containing a value of type a

>>> :{
runST (do
    ref <- newSTRef "hello"
    x <- readSTRef ref
    writeSTRef ref (x ++ "world")
    readSTRef ref )
:}
"helloworld"

Instances

Instances details
NFData2 STRef

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf2 :: (a -> ()) -> (b -> ()) -> STRef a b -> () #

NFData1 (STRef s)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> STRef s a -> () #

NFData (STRef s a)

NOTE: Only strict in the reference and not the referenced value.

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: STRef s a -> () #

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 #

Monoid w => MutableCollection (STRef s w) 
Instance details

Defined in Data.Mutable.Class

Associated Types

type CollElement (STRef s w) #

Methods

newColl :: (PrimMonad m, PrimState m ~ MCState (STRef s w)) => m (STRef s w) #

MutableContainer (STRef s a) 
Instance details

Defined in Data.Mutable.Class

Associated Types

type MCState (STRef s a) #

IsSequence a => MutablePopBack (STRef s a) 
Instance details

Defined in Data.Mutable.Class

Methods

popBack :: (PrimMonad m, PrimState m ~ MCState (STRef s a)) => STRef s a -> m (Maybe (CollElement (STRef s a))) #

IsSequence a => MutablePopFront (STRef s a) 
Instance details

Defined in Data.Mutable.Class

Methods

popFront :: (PrimMonad m, PrimState m ~ MCState (STRef s a)) => STRef s a -> m (Maybe (CollElement (STRef s a))) #

IsSequence a => MutablePushBack (STRef s a) 
Instance details

Defined in Data.Mutable.Class

Methods

pushBack :: (PrimMonad m, PrimState m ~ MCState (STRef s a)) => STRef s a -> CollElement (STRef s a) -> m () #

IsSequence a => MutablePushFront (STRef s a) 
Instance details

Defined in Data.Mutable.Class

Methods

pushFront :: (PrimMonad m, PrimState m ~ MCState (STRef s a)) => STRef s a -> CollElement (STRef s a) -> m () #

MutableRef (STRef s a) 
Instance details

Defined in Data.Mutable.Class

Associated Types

type RefElement (STRef s a) #

Methods

newRef :: (PrimMonad m, PrimState m ~ MCState (STRef s a)) => RefElement (STRef s a) -> m (STRef s a) #

readRef :: (PrimMonad m, PrimState m ~ MCState (STRef s a)) => STRef s a -> m (RefElement (STRef s a)) #

writeRef :: (PrimMonad m, PrimState m ~ MCState (STRef s a)) => STRef s a -> RefElement (STRef s a) -> m () #

modifyRef :: (PrimMonad m, PrimState m ~ MCState (STRef s a)) => STRef s a -> (RefElement (STRef s a) -> RefElement (STRef s a)) -> m () #

modifyRef' :: (PrimMonad m, PrimState m ~ MCState (STRef s a)) => STRef s a -> (RefElement (STRef s a) -> RefElement (STRef s a)) -> m () #

PrimUnlifted (STRef s a) 
Instance details

Defined in Data.Primitive.Unlifted.Class

Associated Types

type Unlifted (STRef s a) :: TYPE UnliftedRep #

type CollElement (STRef s w) 
Instance details

Defined in Data.Mutable.Class

type CollElement (STRef s w) = Element w
type MCState (STRef s a) 
Instance details

Defined in Data.Mutable.Class

type MCState (STRef s a) = s
type RefElement (STRef s a) 
Instance details

Defined in Data.Mutable.Class

type RefElement (STRef s a) = a
type Unlifted (STRef s a) 
Instance details

Defined in Data.Primitive.Unlifted.Class

type Unlifted (STRef s a) = MutVar# s a

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

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

bool :: a -> a -> Bool -> a #

Case analysis for the Bool type. bool x y p evaluates to x when p is False, and evaluates to y when p is True.

This is equivalent to if p then y else x; that is, one can think of it as an if-then-else construct with its arguments reordered.

Examples

Expand

Basic usage:

>>> bool "foo" "bar" True
"bar"
>>> bool "foo" "bar" False
"foo"

Confirm that bool x y p and if p then y else x are equivalent:

>>> let p = True; x = "bar"; y = "foo"
>>> bool x y p == if p then y else x
True
>>> let p = False
>>> bool x y p == if p then y else x
True

Since: base-4.7.0.0

on :: (b -> b -> c) -> (a -> b) -> a -> a -> c infixl 0 #

on b u x y runs the binary function b on the results of applying unary function u to two arguments x and y. From the opposite perspective, it transforms two inputs and combines the outputs.

((+) `on` f) x y = f x + f y

Typical usage: sortBy (compare `on` fst).

Algebraic properties:

  • (*) `on` id = (*) -- (if (*) ∉ {⊥, const ⊥})
  • ((*) `on` f) `on` g = (*) `on` (f . g)
  • flip on f . flip on g = flip on (g . f)

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]

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

Swap the components of a pair.

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.

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.

until :: (a -> Bool) -> (a -> a) -> a -> a #

until p f yields the result of applying f until p holds.

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.

liftA :: Applicative f => (a -> b) -> f a -> f b #

Lift a function to actions. Equivalent to Functor's fmap but implemented using only Applicative's methods: `liftA f a = pure f * a`

As such this function may be used to implement a Functor instance from an Applicative one.

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.

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

Strict (call-by-value) application operator. It takes a function and an argument, evaluates the argument to weak head normal form (WHNF), then calls the function with that value.

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

terror :: HasCallStack => Text -> a #

error applied to Text

Since 0.4.1

getArgs :: MonadIO m => m [Text] #

equating :: Eq a => (b -> a) -> b -> b -> Bool #

type LText = 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

class (Vector Vector a, MVector MVector a) => Unbox a #

Instances

Instances details
Unbox All 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox Any 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox Int16 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox Int64 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox Int8 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox Word16 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox Word32 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox Word64 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox DayOfMonth 
Instance details

Defined in Chronos

Unbox Month 
Instance details

Defined in Chronos

Unbox Word8 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox () 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox Bool 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox Char 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox Double 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox Float 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox Int 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox Word 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox a => Unbox (Complex a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox a => Unbox (Identity a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox a => Unbox (Down a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox a => Unbox (First a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox a => Unbox (Last a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox a => Unbox (Max a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox a => Unbox (Min a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox a => Unbox (WrappedMonoid a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox a => Unbox (Dual a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox a => Unbox (Product a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox a => Unbox (Sum a) 
Instance details

Defined in Data.Vector.Unboxed.Base

(Unbox a, Unbox b) => Unbox (Arg a b) 
Instance details

Defined in Data.Vector.Unboxed.Base

(Unbox a, Unbox b) => Unbox (a, b) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox a => Unbox (Const a b) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox (f a) => Unbox (Alt f a) 
Instance details

Defined in Data.Vector.Unboxed.Base

(Unbox a, Unbox b, Unbox c) => Unbox (a, b, c) 
Instance details

Defined in Data.Vector.Unboxed.Base

(Unbox a, Unbox b, Unbox c, Unbox d) => Unbox (a, b, c, d) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox (f (g a)) => Unbox (Compose f g a) 
Instance details

Defined in Data.Vector.Unboxed.Base

(Unbox a, Unbox b, Unbox c, Unbox d, Unbox e) => Unbox (a, b, c, d, e) 
Instance details

Defined in Data.Vector.Unboxed.Base

(Unbox a, Unbox b, Unbox c, Unbox d, Unbox e, Unbox f) => Unbox (a, b, c, d, e, f) 
Instance details

Defined in Data.Vector.Unboxed.Base

data 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

(<.>) :: FilePath -> String -> FilePath infixr 7 #

Add an extension, even if there is already one there, equivalent to addExtension.

"/directory/path" <.> "ext" == "/directory/path.ext"
"/directory/path" <.> ".ext" == "/directory/path.ext"

(</>) :: FilePath -> FilePath -> FilePath infixr 5 #

Combine two paths with a path separator. If the second path starts with a path separator or a drive letter, then it returns the second. The intention is that readFile (dir </> file) will access the same file as setCurrentDirectory dir; readFile file.

Posix:   "/directory" </> "file.ext" == "/directory/file.ext"
Windows: "/directory" </> "file.ext" == "/directory\\file.ext"
         "directory" </> "/file.ext" == "/file.ext"
Valid x => (takeDirectory x </> takeFileName x) `equalFilePath` x

Combined:

Posix:   "/" </> "test" == "/test"
Posix:   "home" </> "bob" == "home/bob"
Posix:   "x:" </> "foo" == "x:/foo"
Windows: "C:\\foo" </> "bar" == "C:\\foo\\bar"
Windows: "home" </> "bob" == "home\\bob"

Not combined:

Posix:   "home" </> "/bob" == "/bob"
Windows: "home" </> "C:\\bob" == "C:\\bob"

Not combined (tricky):

On Windows, if a filepath starts with a single slash, it is relative to the root of the current drive. In [1], this is (confusingly) referred to as an absolute path. The current behavior of </> is to never combine these forms.

Windows: "home" </> "/bob" == "/bob"
Windows: "home" </> "\\bob" == "\\bob"
Windows: "C:\\home" </> "\\bob" == "\\bob"

On Windows, from [1]: "If a file name begins with only a disk designator but not the backslash after the colon, it is interpreted as a relative path to the current directory on the drive with the specified letter." The current behavior of </> is to never combine these forms.

Windows: "D:\\foo" </> "C:bar" == "C:bar"
Windows: "C:\\foo" </> "C:bar" == "C:bar"

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

preEscapedToMarkup :: ToMarkup a => a -> Markup #

Convert a value to Markup without escaping

toHtml :: ToMarkup a => a -> Html #

type Html = Markup #

unzip :: Zip f => f (a, b) -> (f a, f b) #

zip :: Zip f => f a -> f b -> f (a, b) #

zipWith :: Zip f => (a -> b -> c) -> f a -> f b -> f c #

zipWith3 :: Zip3 f => (a -> b -> c -> d) -> f a -> f b -> f c -> f d #

unzip3 :: Zip3 f => f (a, b, c) -> (f a, f b, f c) #

zip3 :: Zip3 f => f a -> f b -> f c -> f (a, b, c) #

zipWith4 :: Zip4 f => (a -> b -> c -> d -> e) -> f a -> f b -> f c -> f d -> f e #

unzip4 :: Zip4 f => f (a, b, c, d) -> (f a, f b, f c, f d) #

zip4 :: Zip4 f => f a -> f b -> f c -> f d -> f (a, b, c, d) #

zipWith5 :: Zip5 f => (a -> b -> c -> d -> e -> g) -> f a -> f b -> f c -> f d -> f e -> f g #

unzip5 :: Zip5 f => f (a, b, c, d, e) -> (f a, f b, f c, f d, f e) #

zip5 :: Zip5 f => f a -> f b -> f c -> f d -> f e -> f (a, b, c, d, e) #

zipWith6 :: Zip6 f => (a -> b -> c -> d -> e -> g -> h) -> f a -> f b -> f c -> f d -> f e -> f g -> f h #

unzip6 :: Zip6 f => f (a, b, c, d, e, g) -> (f a, f b, f c, f d, f e, f g) #

zip6 :: Zip6 f => f a -> f b -> f c -> f d -> f e -> f g -> f (a, b, c, d, e, g) #

zipWith7 :: Zip7 f => (a -> b -> c -> d -> e -> g -> h -> i) -> f a -> f b -> f c -> f d -> f e -> f g -> f h -> f i #

unzip7 :: Zip7 f => f (a, b, c, d, e, g, h) -> (f a, f b, f c, f d, f e, f g, f h) #

zip7 :: Zip7 f => f a -> f b -> f c -> f d -> f e -> f g -> f h -> f (a, b, c, d, e, g, h) #

textToBuilder :: ToBuilder Text builder => Text -> builder #

Provided for type disambiguation in the presence of OverloadedStrings.

Since 0.1.0.0

type TextBuilder = Builder #

Since 0.1.0.0

type BlazeBuilder = Builder #

Since 0.1.0.0

type ByteStringBuilder = Builder #

Since 0.3.0.0

class Monoid builder => Builder builder lazy | builder -> lazy, lazy -> builder where #

Since 0.1.0.0

Methods

builderToLazy :: builder -> lazy #

Since 0.1.0.0

flushBuilder :: builder #

Since 0.1.0.0

Instances

Instances details
Builder Builder ByteString 
Instance details

Defined in Data.Builder

Builder Builder Text 
Instance details

Defined in Data.Builder

class ToBuilder value builder where #

Since 0.1.0.0

Methods

toBuilder :: value -> builder #

Since 0.1.0.0

Instances

Instances details
ToBuilder Builder Builder 
Instance details

Defined in Data.Builder

Methods

toBuilder :: Builder -> Builder #

ToBuilder ByteString Builder 
Instance details

Defined in Data.Builder

ToBuilder ByteString Builder 
Instance details

Defined in Data.Builder

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 #

ToBuilder Builder Builder 
Instance details

Defined in Data.Builder

Methods

toBuilder :: Builder -> Builder #

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 #

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 #

a ~ Char => ToBuilder [a] Builder 
Instance details

Defined in Data.Builder

Methods

toBuilder :: [a] -> Builder #

a ~ Char => ToBuilder [a] Builder 
Instance details

Defined in Data.Builder

Methods

toBuilder :: [a] -> Builder #

newChan :: MonadIO m => m (Chan a) #

Lifted newChan.

Since: unliftio-0.1.0.0

writeChan :: MonadIO m => Chan a -> a -> m () #

Lifted writeChan.

Since: unliftio-0.1.0.0

readChan :: MonadIO m => Chan a -> m a #

Lifted readChan.

Since: unliftio-0.1.0.0

dupChan :: MonadIO m => Chan a -> m (Chan a) #

Lifted dupChan.

Since: unliftio-0.1.0.0

getChanContents :: MonadIO m => Chan a -> m [a] #

Lifted getChanContents.

Since: unliftio-0.1.0.0

writeList2Chan :: MonadIO m => Chan a -> [a] -> m () #

Lifted writeList2Chan.

Since: unliftio-0.1.0.0

data StringException #

Exception type thrown by throwString.

Note that the second field of the data constructor depends on GHC/base version. For base 4.9 and GHC 8.0 and later, the second field is a call stack. Previous versions of GHC and base do not support call stacks, and the field is simply unit (provided to make pattern matching across GHC versions easier).

Since: unliftio-0.1.0.0

Instances

Instances details
Exception StringException

Since: unliftio-0.1.0.0

Instance details

Defined in UnliftIO.Exception

Show StringException

Since: unliftio-0.1.0.0

Instance details

Defined in UnliftIO.Exception

Eq StringException

Since: unliftio-0.2.19

Instance details

Defined in UnliftIO.Exception

data AsyncExceptionWrapper #

Wrap up a synchronous exception to be treated as an asynchronous exception.

This is intended to be created via toAsyncException.

Since: unliftio-0.1.0.0

Constructors

Exception e => AsyncExceptionWrapper e 

data SyncExceptionWrapper #

Wrap up an asynchronous exception to be treated as a synchronous exception.

This is intended to be created via toSyncException.

Since: unliftio-0.1.0.0

Constructors

Exception e => SyncExceptionWrapper e 

catch #

Arguments

:: (MonadUnliftIO m, Exception e) 
=> m a

action

-> (e -> m a)

handler

-> m a 

Catch a synchronous (but not asynchronous) exception and recover from it.

This is parameterized on the exception type. To catch all synchronous exceptions, use catchAny.

Since: unliftio-0.1.0.0

catchIO :: MonadUnliftIO m => m a -> (IOException -> m a) -> m a #

catch specialized to only catching IOExceptions.

Since: unliftio-0.1.0.0

catchAny :: MonadUnliftIO m => m a -> (SomeException -> m a) -> m a #

catch specialized to catch all synchronous exceptions.

Since: unliftio-0.1.0.0

catchDeep :: (MonadUnliftIO m, Exception e, NFData a) => m a -> (e -> m a) -> m a #

Same as catch, but fully force evaluation of the result value to find all impure exceptions.

Since: unliftio-0.1.0.0

catchAnyDeep :: (NFData a, MonadUnliftIO m) => m a -> (SomeException -> m a) -> m a #

catchDeep specialized to catch all synchronous exception.

Since: unliftio-0.1.0.0

catchJust :: (MonadUnliftIO m, Exception e) => (e -> Maybe b) -> m a -> (b -> m a) -> m a #

catchJust is like catch but it takes an extra argument which is an exception predicate, a function which selects which type of exceptions we're interested in.

Since: unliftio-0.1.0.0

catchSyncOrAsync :: (MonadUnliftIO m, Exception e) => m a -> (e -> m a) -> m a #

A variant of catch that catches both synchronous and asynchronous exceptions.

WARNING: This function (and other *SyncOrAsync functions) is for advanced users. Most of the time, you probably want to use the non-SyncOrAsync versions.

Before attempting to use this function, be familiar with the "Rules for async safe handling" section in this blog post.

Since: unliftio-0.2.17

handle :: (MonadUnliftIO m, Exception e) => (e -> m a) -> m a -> m a #

Flipped version of catch.

Since: unliftio-0.1.0.0

handleIO :: MonadUnliftIO m => (IOException -> m a) -> m a -> m a #

handle specialized to only catching IOExceptions.

Since: unliftio-0.1.0.0

handleAny :: MonadUnliftIO m => (SomeException -> m a) -> m a -> m a #

Flipped version of catchAny.

Since: unliftio-0.1.0.0

handleDeep :: (MonadUnliftIO m, Exception e, NFData a) => (e -> m a) -> m a -> m a #

Flipped version of catchDeep.

Since: unliftio-0.1.0.0

handleAnyDeep :: (MonadUnliftIO m, NFData a) => (SomeException -> m a) -> m a -> m a #

Flipped version of catchAnyDeep.

Since: unliftio-0.1.0.0

handleJust :: (MonadUnliftIO m, Exception e) => (e -> Maybe b) -> (b -> m a) -> m a -> m a #

Flipped catchJust.

Since: unliftio-0.1.0.0

handleSyncOrAsync :: (MonadUnliftIO m, Exception e) => (e -> m a) -> m a -> m a #

A variant of handle that catches both synchronous and asynchronous exceptions.

See catchSyncOrAsync.

Since: unliftio-0.2.17

try :: (MonadUnliftIO m, Exception e) => m a -> m (Either e a) #

Run the given action and catch any synchronous exceptions as a Left value.

This is parameterized on the exception type. To catch all synchronous exceptions, use tryAny.

Since: unliftio-0.1.0.0

tryIO :: MonadUnliftIO m => m a -> m (Either IOException a) #

try specialized to only catching IOExceptions.

Since: unliftio-0.1.0.0

tryAny :: MonadUnliftIO m => m a -> m (Either SomeException a) #

try specialized to catch all synchronous exceptions.

Since: unliftio-0.1.0.0

tryDeep :: (MonadUnliftIO m, Exception e, NFData a) => m a -> m (Either e a) #

Same as try, but fully force evaluation of the result value to find all impure exceptions.

Since: unliftio-0.1.0.0

tryAnyDeep :: (MonadUnliftIO m, NFData a) => m a -> m (Either SomeException a) #

tryDeep specialized to catch all synchronous exceptions.

Since: unliftio-0.1.0.0

tryJust :: (MonadUnliftIO m, Exception e) => (e -> Maybe b) -> m a -> m (Either b a) #

A variant of try that takes an exception predicate to select which exceptions are caught.

Since: unliftio-0.1.0.0

trySyncOrAsync :: (MonadUnliftIO m, Exception e) => m a -> m (Either e a) #

A variant of try that catches both synchronous and asynchronous exceptions.

See catchSyncOrAsync.

Since: unliftio-0.2.17

pureTry :: a -> Either SomeException a #

Evaluate the value to WHNF and catch any synchronous exceptions.

The expression may still have bottom values within it; you may instead want to use pureTryDeep.

Since: unliftio-0.2.2.0

pureTryDeep :: NFData a => a -> Either SomeException a #

Evaluate the value to NF and catch any synchronous exceptions.

Since: unliftio-0.2.2.0

catches :: MonadUnliftIO m => m a -> [Handler m a] -> m a #

Similar to catch, but provides multiple different handler functions.

For more information on motivation, see base's catches. Note that, unlike that function, this function will not catch asynchronous exceptions.

Since: unliftio-0.1.0.0

catchesDeep :: (MonadUnliftIO m, NFData a) => m a -> [Handler m a] -> m a #

Same as catches, but fully force evaluation of the result value to find all impure exceptions.

Since: unliftio-0.1.0.0

evaluate :: MonadIO m => a -> m a #

Lifted version of evaluate.

Since: unliftio-0.1.0.0

evaluateDeep :: (MonadIO m, NFData a) => a -> m a #

Deeply evaluate a value using evaluate and NFData.

Since: unliftio-0.1.0.0

bracket :: MonadUnliftIO m => m a -> (a -> m b) -> (a -> m c) -> m c #

Allocate and clean up a resource safely.

For more information on motivation and usage of this function, see base's bracket. This function has two differences from the one in base. The first, and more obvious, is that it works on any MonadUnliftIO instance, not just IO.

The more subtle difference is that this function will use uninterruptible masking for its cleanup handler. This is a subtle distinction, but at a high level, means that resource cleanup has more guarantees to complete. This comes at the cost that an incorrectly written cleanup function cannot be interrupted.

For more information, please see https://github.com/fpco/safe-exceptions/issues/3.

Since: unliftio-0.1.0.0

bracket_ :: MonadUnliftIO m => m a -> m b -> m c -> m c #

Same as bracket, but does not pass the acquired resource to cleanup and use functions.

For more information, see base's bracket_.

Since: unliftio-0.1.0.0

bracketOnError :: MonadUnliftIO m => m a -> (a -> m b) -> (a -> m c) -> m c #

Same as bracket, but only perform the cleanup if an exception is thrown.

Since: unliftio-0.1.0.0

bracketOnError_ :: MonadUnliftIO m => m a -> m b -> m c -> m c #

A variant of bracketOnError where the return value from the first computation is not required.

Since: unliftio-0.1.0.0

finally #

Arguments

:: MonadUnliftIO m 
=> m a

thing

-> m b

after

-> m a 

Perform thing, guaranteeing that after will run after, even if an exception occurs.

Same interruptible vs uninterrupible points apply as with bracket. See base's finally for more information.

Since: unliftio-0.1.0.0

withException :: (MonadUnliftIO m, Exception e) => m a -> (e -> m b) -> m a #

Like onException, but provides the handler the thrown exception.

Since: unliftio-0.1.0.0

onException :: MonadUnliftIO m => m a -> m b -> m a #

Like finally, but only call after if an exception occurs.

Since: unliftio-0.1.0.0

throwIO :: (MonadIO m, Exception e) => e -> m a #

Synchronously throw the given exception.

Note that, if you provide an exception value which is of an asynchronous type, it will be wrapped up in SyncExceptionWrapper. See toSyncException.

Since: unliftio-0.1.0.0

toSyncException :: Exception e => e -> SomeException #

Convert an exception into a synchronous exception.

For synchronous exceptions, this is the same as toException. For asynchronous exceptions, this will wrap up the exception with SyncExceptionWrapper.

Since: unliftio-0.1.0.0

toAsyncException :: Exception e => e -> SomeException #

Convert an exception into an asynchronous exception.

For asynchronous exceptions, this is the same as toException. For synchronous exceptions, this will wrap up the exception with AsyncExceptionWrapper.

Since: unliftio-0.1.0.0

fromExceptionUnwrap :: Exception e => SomeException -> Maybe e #

Convert from a possibly wrapped exception.

The inverse of toAsyncException and toSyncException. When using those functions (or functions that use them, like throwTo or throwIO), fromException might not be sufficient because the exception might be wrapped within SyncExceptionWrapper or AsyncExceptionWrapper.

Since: unliftio-0.2.17

isSyncException :: Exception e => e -> Bool #

Check if the given exception is synchronous.

Since: unliftio-0.1.0.0

isAsyncException :: Exception e => e -> Bool #

Check if the given exception is asynchronous.

Since: unliftio-0.1.0.0

mask :: MonadUnliftIO m => ((forall a. m a -> m a) -> m b) -> m b #

Unlifted version of mask.

Since: unliftio-0.1.0.0

uninterruptibleMask :: MonadUnliftIO m => ((forall a. m a -> m a) -> m b) -> m b #

Unlifted version of uninterruptibleMask.

Since: unliftio-0.1.0.0

mask_ :: MonadUnliftIO m => m a -> m a #

Unlifted version of mask_.

Since: unliftio-0.1.0.0

uninterruptibleMask_ :: MonadUnliftIO m => m a -> m a #

Unlifted version of uninterruptibleMask_.

Since: unliftio-0.1.0.0

throwString :: (MonadIO m, HasCallStack) => String -> m a #

A convenience function for throwing a user error. This is useful for cases where it would be too high a burden to define your own exception type.

This throws an exception of type StringException. When GHC supports it (base 4.9 and GHC 8.0 and onward), it includes a call stack.

Since: unliftio-0.1.0.0

stringException :: HasCallStack => String -> StringException #

Smart constructor for a StringException that deals with the call stack.

Since: unliftio-0.1.0.0

throwTo :: (Exception e, MonadIO m) => ThreadId -> e -> m () #

Throw an asynchronous exception to another thread.

Synchronously typed exceptions will be wrapped into an AsyncExceptionWrapper, see https://github.com/fpco/safe-exceptions#determining-sync-vs-async.

It's usually a better idea to use the UnliftIO.Async module, see https://github.com/fpco/safe-exceptions#quickstart.

Since: unliftio-0.1.0.0

impureThrow :: Exception e => e -> a #

Generate a pure value which, when forced, will synchronously throw the given exception.

Generally it's better to avoid using this function and instead use throwIO, see https://github.com/fpco/safe-exceptions#quickstart.

Since: unliftio-0.1.0.0

fromEither :: (Exception e, MonadIO m) => Either e a -> m a #

Unwrap an Either value, throwing its Left value as a runtime exception via throwIO if present.

Since: unliftio-0.1.0.0

fromEitherIO :: (Exception e, MonadIO m) => IO (Either e a) -> m a #

Same as fromEither, but works on an IO-wrapped Either.

Since: unliftio-0.1.0.0

fromEitherM :: (Exception e, MonadIO m) => m (Either e a) -> m a #

Same as fromEither, but works on an m-wrapped Either.

Since: unliftio-0.1.0.0

mapExceptionM :: (Exception e1, Exception e2, MonadUnliftIO m) => (e1 -> e2) -> m a -> m a #

Same as mapException, except works in a monadic context.

Since: unliftio-0.2.15

withFile :: MonadUnliftIO m => FilePath -> IOMode -> (Handle -> m a) -> m a #

Unlifted version of withFile.

Since: unliftio-0.1.0.0

withBinaryFile :: MonadUnliftIO m => FilePath -> IOMode -> (Handle -> m a) -> m a #

Unlifted version of withBinaryFile.

Since: unliftio-0.1.0.0

openFile :: MonadIO m => FilePath -> IOMode -> m Handle #

Lifted version of openFile

Since: unliftio-0.2.20

hClose :: MonadIO m => Handle -> m () #

Lifted version of hClose

Since: unliftio-0.2.1.0

hFlush :: MonadIO m => Handle -> m () #

Lifted version of hFlush

Since: unliftio-0.2.1.0

hFileSize :: MonadIO m => Handle -> m Integer #

Lifted version of hFileSize

Since: unliftio-0.2.1.0

hSetFileSize :: MonadIO m => Handle -> Integer -> m () #

Lifted version of hSetFileSize

Since: unliftio-0.2.1.0

hIsEOF :: MonadIO m => Handle -> m Bool #

Lifted version of hIsEOF

Since: unliftio-0.2.1.0

hSetBuffering :: MonadIO m => Handle -> BufferMode -> m () #

Lifted version of hSetBuffering

Since: unliftio-0.2.1.0

hGetBuffering :: MonadIO m => Handle -> m BufferMode #

Lifted version of hGetBuffering

Since: unliftio-0.2.1.0

hSeek :: MonadIO m => Handle -> SeekMode -> Integer -> m () #

Lifted version of hSeek

Since: unliftio-0.2.1.0

hTell :: MonadIO m => Handle -> m Integer #

Lifted version of hTell

Since: unliftio-0.2.1.0

hIsOpen :: MonadIO m => Handle -> m Bool #

Lifted version of hIsOpen

Since: unliftio-0.2.1.0

hIsClosed :: MonadIO m => Handle -> m Bool #

Lifted version of hIsClosed

Since: unliftio-0.2.1.0

hIsReadable :: MonadIO m => Handle -> m Bool #

Lifted version of hIsReadable

Since: unliftio-0.2.1.0

hIsWritable :: MonadIO m => Handle -> m Bool #

Lifted version of hIsWritable

Since: unliftio-0.2.1.0

hIsSeekable :: MonadIO m => Handle -> m Bool #

Lifted version of hIsSeekable

Since: unliftio-0.2.1.0

hIsTerminalDevice :: MonadIO m => Handle -> m Bool #

Lifted version of hIsTerminalDevice

Since: unliftio-0.2.1.0

hSetEcho :: MonadIO m => Handle -> Bool -> m () #

Lifted version of hSetEcho

Since: unliftio-0.2.1.0

hGetEcho :: MonadIO m => Handle -> m Bool #

Lifted version of hGetEcho

Since: unliftio-0.2.1.0

hWaitForInput :: MonadIO m => Handle -> Int -> m Bool #

Lifted version of hWaitForInput

Since: unliftio-0.2.1.0

hReady :: MonadIO m => Handle -> m Bool #

Lifted version of hReady

Since: unliftio-0.2.1.0

getMonotonicTime :: MonadIO m => m Double #

Get the number of seconds which have passed since an arbitrary starting time, useful for calculating runtime in a program.

Since: unliftio-0.2.3.0

newIORef :: MonadIO m => a -> m (IORef a) #

Lifted newIORef.

Since: unliftio-0.1.0.0

readIORef :: MonadIO m => IORef a -> m a #

Lifted readIORef.

Since: unliftio-0.1.0.0

writeIORef :: MonadIO m => IORef a -> a -> m () #

Lifted writeIORef.

Since: unliftio-0.1.0.0

modifyIORef :: MonadIO m => IORef a -> (a -> a) -> m () #

Lifted modifyIORef.

Since: unliftio-0.1.0.0

modifyIORef' :: MonadIO m => IORef a -> (a -> a) -> m () #

Lifted modifyIORef'.

Since: unliftio-0.1.0.0

atomicModifyIORef :: MonadIO m => IORef a -> (a -> (a, b)) -> m b #

Lifted atomicModifyIORef.

Since: unliftio-0.1.0.0

atomicModifyIORef' :: MonadIO m => IORef a -> (a -> (a, b)) -> m b #

Lifted atomicModifyIORef'.

Since: unliftio-0.1.0.0

atomicWriteIORef :: MonadIO m => IORef a -> a -> m () #

Lifted atomicWriteIORef.

Since: unliftio-0.1.0.0

mkWeakIORef :: MonadUnliftIO m => IORef a -> m () -> m (Weak (IORef a)) #

Unlifted mkWeakIORef.

Since: unliftio-0.1.0.0

data ConcException #

Things that can go wrong in the structure of a Conc. These are programmer errors.

Since: unliftio-0.2.9.0

Instances

Instances details
Exception ConcException 
Instance details

Defined in UnliftIO.Internals.Async

Generic ConcException 
Instance details

Defined in UnliftIO.Internals.Async

Associated Types

type Rep ConcException :: Type -> Type #

Show ConcException 
Instance details

Defined in UnliftIO.Internals.Async

Eq ConcException 
Instance details

Defined in UnliftIO.Internals.Async

Ord ConcException 
Instance details

Defined in UnliftIO.Internals.Async

type Rep ConcException 
Instance details

Defined in UnliftIO.Internals.Async

type Rep ConcException = D1 ('MetaData "ConcException" "UnliftIO.Internals.Async" "unliftio-0.2.21.0-EzVbfCbIIXl1m5WBapJPer" 'False) (C1 ('MetaCons "EmptyWithNoAlternative" 'PrefixI 'False) (U1 :: Type -> Type))

data Conc (m :: Type -> Type) a #

A more efficient alternative to Concurrently, which reduces the number of threads that need to be forked. For more information, see this blog post. This is provided as a separate type to Concurrently as it has a slightly different API.

Use the conc function to construct values of type Conc, and runConc to execute the composed actions. You can use the Applicative instance to run different actions and wait for all of them to complete, or the Alternative instance to wait for the first thread to complete.

In the event of a runtime exception thrown by any of the children threads, or an asynchronous exception received in the parent thread, all threads will be killed with an AsyncCancelled exception and the original exception rethrown. If multiple exceptions are generated by different threads, there are no guarantees on which exception will end up getting rethrown.

For many common use cases, you may prefer using helper functions in this module like mapConcurrently.

There are some intentional differences in behavior to Concurrently:

  • Children threads are always launched in an unmasked state, not the inherited state of the parent thread.

Note that it is a programmer error to use the Alternative instance in such a way that there are no alternatives to an empty, e.g. runConc (empty | empty). In such a case, a ConcException will be thrown. If there was an Alternative in the standard libraries without empty, this library would use it instead.

Since: unliftio-0.2.9.0

Instances

Instances details
MonadUnliftIO m => Alternative (Conc m)

Since: unliftio-0.2.9.0

Instance details

Defined in UnliftIO.Internals.Async

Methods

empty :: Conc m a #

(<|>) :: Conc m a -> Conc m a -> Conc m a #

some :: Conc m a -> Conc m [a] #

many :: Conc m a -> Conc m [a] #

MonadUnliftIO m => Applicative (Conc m)

Since: unliftio-0.2.9.0

Instance details

Defined in UnliftIO.Internals.Async

Methods

pure :: a -> Conc m a #

(<*>) :: Conc m (a -> b) -> Conc m a -> Conc m b #

liftA2 :: (a -> b -> c) -> Conc m a -> Conc m b -> Conc m c #

(*>) :: Conc m a -> Conc m b -> Conc m b #

(<*) :: Conc m a -> Conc m b -> Conc m a #

Functor m => Functor (Conc m) 
Instance details

Defined in UnliftIO.Internals.Async

Methods

fmap :: (a -> b) -> Conc m a -> Conc m b #

(<$) :: a -> Conc m b -> Conc m a #

(Monoid a, MonadUnliftIO m) => Monoid (Conc m a)

Since: unliftio-0.2.9.0

Instance details

Defined in UnliftIO.Internals.Async

Methods

mempty :: Conc m a #

mappend :: Conc m a -> Conc m a -> Conc m a #

mconcat :: [Conc m a] -> Conc m a #

(MonadUnliftIO m, Semigroup a) => Semigroup (Conc m a)

Since: unliftio-0.2.9.0

Instance details

Defined in UnliftIO.Internals.Async

Methods

(<>) :: Conc m a -> Conc m a -> Conc m a #

sconcat :: NonEmpty (Conc m a) -> Conc m a #

stimes :: Integral b => b -> Conc m a -> Conc m a #

newtype Concurrently (m :: Type -> Type) a #

Unlifted Concurrently.

Since: unliftio-0.1.0.0

Constructors

Concurrently 

Fields

Instances

Instances details
MonadUnliftIO m => Alternative (Concurrently m)

Composing two unlifted Concurrently values using Alternative is the equivalent to using a race combinator, the asynchrounous sub-routine that returns a value first is the one that gets it's value returned, the slowest sub-routine gets cancelled and it's thread is killed.

Since: unliftio-0.1.0.0

Instance details

Defined in UnliftIO.Internals.Async

Methods

empty :: Concurrently m a #

(<|>) :: Concurrently m a -> Concurrently m a -> Concurrently m a #

some :: Concurrently m a -> Concurrently m [a] #

many :: Concurrently m a -> Concurrently m [a] #

MonadUnliftIO m => Applicative (Concurrently m)

Since: unliftio-0.1.0.0

Instance details

Defined in UnliftIO.Internals.Async

Methods

pure :: a -> Concurrently m a #

(<*>) :: Concurrently m (a -> b) -> Concurrently m a -> Concurrently m b #

liftA2 :: (a -> b -> c) -> Concurrently m a -> Concurrently m b -> Concurrently m c #

(*>) :: Concurrently m a -> Concurrently m b -> Concurrently m b #

(<*) :: Concurrently m a -> Concurrently m b -> Concurrently m a #

Monad m => Functor (Concurrently m)

Since: unliftio-0.1.0.0

Instance details

Defined in UnliftIO.Internals.Async

Methods

fmap :: (a -> b) -> Concurrently m a -> Concurrently m b #

(<$) :: a -> Concurrently m b -> Concurrently m a #

(Semigroup a, Monoid a, MonadUnliftIO m) => Monoid (Concurrently m a)

Since: unliftio-0.1.0.0

Instance details

Defined in UnliftIO.Internals.Async

(MonadUnliftIO m, Semigroup a) => Semigroup (Concurrently m a)

Only defined by async for base >= 4.9.

Since: unliftio-0.1.0.0

Instance details

Defined in UnliftIO.Internals.Async

Methods

(<>) :: Concurrently m a -> Concurrently m a -> Concurrently m a #

sconcat :: NonEmpty (Concurrently m a) -> Concurrently m a #

stimes :: Integral b => b -> Concurrently m a -> Concurrently m a #

async :: MonadUnliftIO m => m a -> m (Async a) #

Unlifted async.

Since: unliftio-0.1.0.0

asyncBound :: MonadUnliftIO m => m a -> m (Async a) #

Unlifted asyncBound.

Since: unliftio-0.1.0.0

asyncOn :: MonadUnliftIO m => Int -> m a -> m (Async a) #

Unlifted asyncOn.

Since: unliftio-0.1.0.0

asyncWithUnmask :: MonadUnliftIO m => ((forall b. m b -> m b) -> m a) -> m (Async a) #

Unlifted asyncWithUnmask.

Since: unliftio-0.1.0.0

asyncOnWithUnmask :: MonadUnliftIO m => Int -> ((forall b. m b -> m b) -> m a) -> m (Async a) #

Unlifted asyncOnWithUnmask.

Since: unliftio-0.1.0.0

withAsync :: MonadUnliftIO m => m a -> (Async a -> m b) -> m b #

Unlifted withAsync.

Since: unliftio-0.1.0.0

withAsyncBound :: MonadUnliftIO m => m a -> (Async a -> m b) -> m b #

Unlifted withAsyncBound.

Since: unliftio-0.1.0.0

withAsyncOn :: MonadUnliftIO m => Int -> m a -> (Async a -> m b) -> m b #

Unlifted withAsyncOn.

Since: unliftio-0.1.0.0

withAsyncWithUnmask :: MonadUnliftIO m => ((forall c. m c -> m c) -> m a) -> (Async a -> m b) -> m b #

Unlifted withAsyncWithUnmask.

Since: unliftio-0.1.0.0

withAsyncOnWithUnmask :: MonadUnliftIO m => Int -> ((forall c. m c -> m c) -> m a) -> (Async a -> m b) -> m b #

Unlifted withAsyncOnWithMask.

Since: unliftio-0.1.0.0

wait :: MonadIO m => Async a -> m a #

Lifted wait.

Since: unliftio-0.1.0.0

poll :: MonadIO m => Async a -> m (Maybe (Either SomeException a)) #

Lifted poll.

Since: unliftio-0.1.0.0

waitCatch :: MonadIO m => Async a -> m (Either SomeException a) #

Lifted waitCatch.

Since: unliftio-0.1.0.0

cancel :: MonadIO m => Async a -> m () #

Lifted cancel.

Since: unliftio-0.1.0.0

uninterruptibleCancel :: MonadIO m => Async a -> m () #

Lifted uninterruptibleCancel.

Since: unliftio-0.1.0.0

cancelWith :: (Exception e, MonadIO m) => Async a -> e -> m () #

Lifted cancelWith. Additionally uses toAsyncException to ensure async exception safety.

Since: unliftio-0.1.0.0

waitAny :: MonadIO m => [Async a] -> m (Async a, a) #

Lifted waitAny.

Since: unliftio-0.1.0.0

waitAnyCatch :: MonadIO m => [Async a] -> m (Async a, Either SomeException a) #

Lifted waitAnyCatch.

Since: unliftio-0.1.0.0

waitAnyCancel :: MonadIO m => [Async a] -> m (Async a, a) #

Lifted waitAnyCancel.

Since: unliftio-0.1.0.0

waitAnyCatchCancel :: MonadIO m => [Async a] -> m (Async a, Either SomeException a) #

Lifted waitAnyCatchCancel.

Since: unliftio-0.1.0.0

waitEither :: MonadIO m => Async a -> Async b -> m (Either a b) #

Lifted waitEither.

Since: unliftio-0.1.0.0

waitEitherCatch :: MonadIO m => Async a -> Async b -> m (Either (Either SomeException a) (Either SomeException b)) #

Lifted waitEitherCatch.

Since: unliftio-0.1.0.0

waitEitherCancel :: MonadIO m => Async a -> Async b -> m (Either a b) #

Lifted waitEitherCancel.

Since: unliftio-0.1.0.0

waitEitherCatchCancel :: MonadIO m => Async a -> Async b -> m (Either (Either SomeException a) (Either SomeException b)) #

Lifted waitEitherCatchCancel.

Since: unliftio-0.1.0.0

waitEither_ :: MonadIO m => Async a -> Async b -> m () #

Lifted waitEither_.

Since: unliftio-0.1.0.0

waitBoth :: MonadIO m => Async a -> Async b -> m (a, b) #

Lifted waitBoth.

Since: unliftio-0.1.0.0

link :: MonadIO m => Async a -> m () #

Lifted link.

Since: unliftio-0.1.0.0

link2 :: MonadIO m => Async a -> Async b -> m () #

Lifted link2.

Since: unliftio-0.1.0.0

race :: MonadUnliftIO m => m a -> m b -> m (Either a b) #

Unlifted race.

Since: unliftio-0.1.0.0

race_ :: MonadUnliftIO m => m a -> m b -> m () #

Unlifted race_.

Since: unliftio-0.1.0.0

concurrently :: MonadUnliftIO m => m a -> m b -> m (a, b) #

Unlifted concurrently.

Since: unliftio-0.1.0.0

concurrently_ :: MonadUnliftIO m => m a -> m b -> m () #

Unlifted concurrently_.

Since: unliftio-0.1.0.0

forConcurrently :: (MonadUnliftIO m, Traversable t) => t a -> (a -> m b) -> m (t b) #

Similar to mapConcurrently but with arguments flipped

Since: unliftio-0.1.0.0

forConcurrently_ :: (MonadUnliftIO m, Foldable f) => f a -> (a -> m b) -> m () #

Similar to mapConcurrently_ but with arguments flipped

Since: unliftio-0.1.0.0

replicateConcurrently :: MonadUnliftIO m => Int -> m b -> m [b] #

Unlifted replicateConcurrently.

Since: unliftio-0.1.0.0

replicateConcurrently_ :: (Applicative m, MonadUnliftIO m) => Int -> m a -> m () #

Unlifted replicateConcurrently_.

Since: unliftio-0.1.0.0

mapConcurrently :: (MonadUnliftIO m, Traversable t) => (a -> m b) -> t a -> m (t b) #

Executes a Traversable container of items concurrently, it uses the Flat type internally.

Since: unliftio-0.1.0.0

mapConcurrently_ :: (MonadUnliftIO m, Foldable f) => (a -> m b) -> f a -> m () #

Executes a Traversable container of items concurrently, it uses the Flat type internally. This function ignores the results.

Since: unliftio-0.1.0.0

conc :: m a -> Conc m a #

Construct a value of type Conc from an action. Compose these values using the typeclass instances (most commonly Applicative and Alternative) and then run with runConc.

Since: unliftio-0.2.9.0

runConc :: MonadUnliftIO m => Conc m a -> m a #

Run a Conc value on multiple threads.

Since: unliftio-0.2.9.0

pooledMapConcurrentlyN #

Arguments

:: (MonadUnliftIO m, Traversable t) 
=> Int

Max. number of threads. Should not be less than 1.

-> (a -> m b) 
-> t a 
-> m (t b) 

Like mapConcurrently from async, but instead of one thread per element, it does pooling from a set of threads. This is useful in scenarios where resource consumption is bounded and for use cases where too many concurrent tasks aren't allowed.

Example usage

Expand
import Say

action :: Int -> IO Int
action n = do
  tid <- myThreadId
  sayString $ show tid
  threadDelay (2 * 10^6) -- 2 seconds
  return n

main :: IO ()
main = do
  yx <- pooledMapConcurrentlyN 5 (\x -> action x) [1..5]
  print yx

On executing you can see that five threads have been spawned:

$ ./pool
ThreadId 36
ThreadId 38
ThreadId 40
ThreadId 42
ThreadId 44
[1,2,3,4,5]

Let's modify the above program such that there are less threads than the number of items in the list:

import Say

action :: Int -> IO Int
action n = do
  tid <- myThreadId
  sayString $ show tid
  threadDelay (2 * 10^6) -- 2 seconds
  return n

main :: IO ()
main = do
  yx <- pooledMapConcurrentlyN 3 (\x -> action x) [1..5]
  print yx

On executing you can see that only three threads are active totally:

$ ./pool
ThreadId 35
ThreadId 37
ThreadId 39
ThreadId 35
ThreadId 39
[1,2,3,4,5]

Since: unliftio-0.2.10

pooledMapConcurrently :: (MonadUnliftIO m, Traversable t) => (a -> m b) -> t a -> m (t b) #

Similar to pooledMapConcurrentlyN but with number of threads set from getNumCapabilities. Usually this is useful for CPU bound tasks.

Since: unliftio-0.2.10

pooledForConcurrentlyN #

Arguments

:: (MonadUnliftIO m, Traversable t) 
=> Int

Max. number of threads. Should not be less than 1.

-> t a 
-> (a -> m b) 
-> m (t b) 

Similar to pooledMapConcurrentlyN but with flipped arguments.

Since: unliftio-0.2.10

pooledForConcurrently :: (MonadUnliftIO m, Traversable t) => t a -> (a -> m b) -> m (t b) #

Similar to pooledForConcurrentlyN but with number of threads set from getNumCapabilities. Usually this is useful for CPU bound tasks.

Since: unliftio-0.2.10

pooledMapConcurrentlyN_ #

Arguments

:: (MonadUnliftIO m, Foldable f) 
=> Int

Max. number of threads. Should not be less than 1.

-> (a -> m b) 
-> f a 
-> m () 

Like pooledMapConcurrentlyN but with the return value discarded.

Since: unliftio-0.2.10

pooledMapConcurrently_ :: (MonadUnliftIO m, Foldable f) => (a -> m b) -> f a -> m () #

Like pooledMapConcurrently but with the return value discarded.

Since: unliftio-0.2.10

pooledForConcurrently_ :: (MonadUnliftIO m, Foldable f) => f a -> (a -> m b) -> m () #

Like pooledMapConcurrently_ but with flipped arguments.

Since: unliftio-0.2.10

pooledForConcurrentlyN_ #

Arguments

:: (MonadUnliftIO m, Foldable t) 
=> Int

Max. number of threads. Should not be less than 1.

-> t a 
-> (a -> m b) 
-> m () 

Like pooledMapConcurrentlyN_ but with flipped arguments.

Since: unliftio-0.2.10

pooledReplicateConcurrentlyN #

Arguments

:: MonadUnliftIO m 
=> Int

Max. number of threads. Should not be less than 1.

-> Int

Number of times to perform the action.

-> m a 
-> m [a] 

Pooled version of replicateConcurrently. Performs the action in the pooled threads.

Since: unliftio-0.2.10

pooledReplicateConcurrently #

Arguments

:: MonadUnliftIO m 
=> Int

Number of times to perform the action.

-> m a 
-> m [a] 

Similar to pooledReplicateConcurrentlyN but with number of threads set from getNumCapabilities. Usually this is useful for CPU bound tasks.

Since: unliftio-0.2.10

pooledReplicateConcurrentlyN_ #

Arguments

:: MonadUnliftIO m 
=> Int

Max. number of threads. Should not be less than 1.

-> Int

Number of times to perform the action.

-> m a 
-> m () 

Pooled version of replicateConcurrently_. Performs the action in the pooled threads.

Since: unliftio-0.2.10

pooledReplicateConcurrently_ #

Arguments

:: MonadUnliftIO m 
=> Int

Number of times to perform the action.

-> m a 
-> m () 

Similar to pooledReplicateConcurrently_ but with number of threads set from getNumCapabilities. Usually this is useful for CPU bound tasks.

Since: unliftio-0.2.10

newEmptyMVar :: MonadIO m => m (MVar a) #

Lifted newEmptyMVar.

Since: unliftio-0.1.0.0

newMVar :: MonadIO m => a -> m (MVar a) #

Lifted newMVar.

Since: unliftio-0.1.0.0

takeMVar :: MonadIO m => MVar a -> m a #

Lifted takeMVar.

Since: unliftio-0.1.0.0

putMVar :: MonadIO m => MVar a -> a -> m () #

Lifted putMVar.

Since: unliftio-0.1.0.0

readMVar :: MonadIO m => MVar a -> m a #

Lifted readMVar.

Since: unliftio-0.1.0.0

swapMVar :: MonadIO m => MVar a -> a -> m a #

Lifted swapMVar.

Since: unliftio-0.1.0.0

tryTakeMVar :: MonadIO m => MVar a -> m (Maybe a) #

Lifted tryTakeMVar.

Since: unliftio-0.1.0.0

tryPutMVar :: MonadIO m => MVar a -> a -> m Bool #

Lifted tryPutMVar.

Since: unliftio-0.1.0.0

isEmptyMVar :: MonadIO m => MVar a -> m Bool #

Lifted isEmptyMVar.

Since: unliftio-0.1.0.0

tryReadMVar :: MonadIO m => MVar a -> m (Maybe a) #

Lifted tryReadMVar.

Since: unliftio-0.1.0.0

withMVar :: MonadUnliftIO m => MVar a -> (a -> m b) -> m b #

Unlifted withMVar.

Since: unliftio-0.1.0.0

withMVarMasked :: MonadUnliftIO m => MVar a -> (a -> m b) -> m b #

Unlifted withMVarMasked.

Since: unliftio-0.1.0.0

modifyMVar_ :: MonadUnliftIO m => MVar a -> (a -> m a) -> m () #

Unlifted modifyMVar_.

Since: unliftio-0.1.0.0

modifyMVar :: MonadUnliftIO m => MVar a -> (a -> m (a, b)) -> m b #

Unlifted modifyMVar.

Since: unliftio-0.1.0.0

modifyMVarMasked_ :: MonadUnliftIO m => MVar a -> (a -> m a) -> m () #

Unlifted modifyMVarMasked_.

Since: unliftio-0.1.0.0

modifyMVarMasked :: MonadUnliftIO m => MVar a -> (a -> m (a, b)) -> m b #

Unlifted modifyMVarMasked.

Since: unliftio-0.1.0.0

mkWeakMVar :: MonadUnliftIO m => MVar a -> m () -> m (Weak (MVar a)) #

Unlifted mkWeakMVar.

Since: unliftio-0.1.0.0

data Memoized a #

A "run once" value, with results saved. Extract the value with runMemoized. For single-threaded usage, you can use memoizeRef to create a value. If you need guarantees that only one thread will run the action at a time, use memoizeMVar.

Note that this type provides a Show instance for convenience, but not useful information can be provided.

Since: unliftio-0.2.8.0

Instances

Instances details
Applicative Memoized 
Instance details

Defined in UnliftIO.Memoize

Methods

pure :: a -> Memoized a #

(<*>) :: Memoized (a -> b) -> Memoized a -> Memoized b #

liftA2 :: (a -> b -> c) -> Memoized a -> Memoized b -> Memoized c #

(*>) :: Memoized a -> Memoized b -> Memoized b #

(<*) :: Memoized a -> Memoized b -> Memoized a #

Functor Memoized 
Instance details

Defined in UnliftIO.Memoize

Methods

fmap :: (a -> b) -> Memoized a -> Memoized b #

(<$) :: a -> Memoized b -> Memoized a #

Monad Memoized 
Instance details

Defined in UnliftIO.Memoize

Methods

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

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

return :: a -> Memoized a #

Show (Memoized a) 
Instance details

Defined in UnliftIO.Memoize

Methods

showsPrec :: Int -> Memoized a -> ShowS #

show :: Memoized a -> String #

showList :: [Memoized a] -> ShowS #

runMemoized :: MonadIO m => Memoized a -> m a #

Extract a value from a Memoized, running an action if no cached value is available.

Since: unliftio-0.2.8.0

memoizeRef :: MonadUnliftIO m => m a -> m (Memoized a) #

Create a new Memoized value using an IORef under the surface. Note that the action may be run in multiple threads simultaneously, so this may not be thread safe (depending on the underlying action). Consider using memoizeMVar.

Since: unliftio-0.2.8.0

memoizeMVar :: MonadUnliftIO m => m a -> m (Memoized a) #

Same as memoizeRef, but uses an MVar to ensure that an action is only run once, even in a multithreaded application.

Since: unliftio-0.2.8.0

newQSem :: MonadIO m => Int -> m QSem #

Lifted newQSem.

Since: unliftio-0.2.14

waitQSem :: MonadIO m => QSem -> m () #

Lifted waitQSem.

Since: unliftio-0.2.14

signalQSem :: MonadIO m => QSem -> m () #

Lifted signalQSem.

Since: unliftio-0.2.14

withQSem :: MonadUnliftIO m => QSem -> m a -> m a #

withQSem is an exception-safe wrapper for performing the provided operation while holding a unit of value from the semaphore. It ensures the semaphore cannot be leaked if there are exceptions.

Since: unliftio-0.2.14

newQSemN :: MonadIO m => Int -> m QSemN #

Lifted newQSemN.

Since: unliftio-0.2.14

waitQSemN :: MonadIO m => QSemN -> Int -> m () #

Lifted waitQSemN.

Since: unliftio-0.2.14

signalQSemN :: MonadIO m => QSemN -> Int -> m () #

Lifted signalQSemN.

Since: unliftio-0.2.14

withQSemN :: MonadUnliftIO m => QSemN -> Int -> m a -> m a #

withQSemN is an exception-safe wrapper for performing the provided operation while holding N unit of value from the semaphore. It ensures the semaphore cannot be leaked if there are exceptions.

Since: unliftio-0.2.14

atomically :: MonadIO m => STM a -> m a #

Lifted version of atomically

Since: unliftio-0.2.1.0

retrySTM :: STM a #

Renamed retry for unqualified export

Since: unliftio-0.2.1.0

checkSTM :: Bool -> STM () #

Renamed check for unqualified export

Since: unliftio-0.2.1.0

newTVarIO :: MonadIO m => a -> m (TVar a) #

Lifted version of newTVarIO

Since: unliftio-0.2.1.0

readTVarIO :: MonadIO m => TVar a -> m a #

Lifted version of readTVarIO

Since: unliftio-0.2.1.0

registerDelay :: MonadIO m => Int -> m (TVar Bool) #

Lifted version of registerDelay

Since: unliftio-0.2.1.0

mkWeakTVar :: MonadUnliftIO m => TVar a -> m () -> m (Weak (TVar a)) #

Lifted version of mkWeakTVar

Since: unliftio-0.2.1.0

newTMVarIO :: MonadIO m => a -> m (TMVar a) #

Lifted version of newTMVarIO

Since: unliftio-0.2.1.0

newEmptyTMVarIO :: MonadIO m => m (TMVar a) #

Lifted version of newEmptyTMVarIO

Since: unliftio-0.2.1.0

mkWeakTMVar :: MonadUnliftIO m => TMVar a -> m () -> m (Weak (TMVar a)) #

Lifted version of mkWeakTMVar

Since: unliftio-0.2.1.0

newTChanIO :: MonadIO m => m (TChan a) #

Lifted version of newTChanIO

Since: unliftio-0.2.1.0

newBroadcastTChanIO :: MonadIO m => m (TChan a) #

Lifted version of newBroadcastTChanIO

Since: unliftio-0.2.1.0

newTQueueIO :: MonadIO m => m (TQueue a) #

Lifted version of newTQueueIO

Since: unliftio-0.2.1.0

newTBQueueIO :: MonadIO m => Natural -> m (TBQueue a) #

Lifted version of newTBQueueIO

Since: unliftio-0.2.1.0

withSystemTempFile #

Arguments

:: MonadUnliftIO m 
=> String

File name template. See openTempFile.

-> (FilePath -> Handle -> m a)

Callback that can use the file

-> m a 

Create and use a temporary file in the system standard temporary directory.

Behaves exactly the same as withTempFile, except that the parent temporary directory will be that returned by getCanonicalTemporaryDirectory.

Since: unliftio-0.1.0.0

withSystemTempDirectory #

Arguments

:: MonadUnliftIO m 
=> String

Directory name template. See openTempFile.

-> (FilePath -> m a)

Callback that can use the directory.

-> m a 

Create and use a temporary directory in the system standard temporary directory.

Behaves exactly the same as withTempDirectory, except that the parent temporary directory will be that returned by getCanonicalTemporaryDirectory.

Since: unliftio-0.1.0.0

withTempFile #

Arguments

:: MonadUnliftIO m 
=> FilePath

Temp dir to create the file in.

-> String

File name template. See openTempFile.

-> (FilePath -> Handle -> m a)

Callback that can use the file.

-> m a 

Use a temporary filename that doesn't already exist.

Creates a new temporary file inside the given directory, making use of the template. The temp file is deleted after use. For example:

withTempFile "src" "sdist." $ \tmpFile hFile -> do ...

The tmpFile will be file in the given directory, e.g. src/sdist.342.

Since: unliftio-0.1.0.0

withTempDirectory #

Arguments

:: MonadUnliftIO m 
=> FilePath

Temp directory to create the directory in.

-> String

Directory name template. See openTempFile.

-> (FilePath -> m a)

Callback that can use the directory.

-> m a 

Create and use a temporary directory.

Creates a new temporary directory inside the given directory, making use of the template. The temp directory is deleted after use. For example:

withTempDirectory "src" "sdist." $ \tmpDir -> do ...

The tmpDir will be a new subdirectory of the given directory, e.g. src/sdist.342.

Since: unliftio-0.1.0.0

timeout :: MonadUnliftIO m => Int -> m a -> m (Maybe a) #

Unlifted timeout.

Since: unliftio-0.1.0.0

wrappedWithRunInIO #

Arguments

:: MonadUnliftIO n 
=> (n b -> m b)

The wrapper, for instance IdentityT.

-> (forall a. m a -> n a)

The inverse, for instance runIdentityT.

-> ((forall a. m a -> IO a) -> IO b)

The actual function to invoke withRunInIO with.

-> m b 

A helper function for implementing MonadUnliftIO instances. Useful for the common case where you want to simply delegate to the underlying transformer.

Example

Expand
newtype AppT m a = AppT { unAppT :: ReaderT Int (ResourceT m) a }
  deriving (Functor, Applicative, Monad, MonadIO)
  -- Unfortunately, deriving MonadUnliftIO does not work.

instance MonadUnliftIO m => MonadUnliftIO (AppT m) where
  withRunInIO = wrappedWithRunInIO AppT unAppT

Since: unliftio-core-0.1.2.0

toIO :: MonadUnliftIO m => m a -> m (IO a) #

Convert an action in m to an action in IO.

Since: unliftio-core-0.1.0.0

withUnliftIO :: MonadUnliftIO m => (UnliftIO m -> IO a) -> m a #

Convenience function for capturing the monadic context and running an IO action. The UnliftIO newtype wrapper is rarely needed, so prefer withRunInIO to this function.

Since: unliftio-core-0.1.0.0

askRunInIO :: MonadUnliftIO m => m (m a -> IO a) #

Same as askUnliftIO, but returns a monomorphic function instead of a polymorphic newtype wrapper. If you only need to apply the transformation on one concrete type, this function can be more convenient.

Since: unliftio-core-0.1.0.0

askUnliftIO :: MonadUnliftIO m => m (UnliftIO m) #

Capture the current monadic context, providing the ability to run monadic actions in IO.

See UnliftIO for an explanation of why we need a helper datatype here.

Prior to version 0.2.0.0 of this library, this was a method in the MonadUnliftIO type class. It was moved out due to https://github.com/fpco/unliftio/issues/55.

Since: unliftio-core-0.1.0.0

newtype UnliftIO (m :: Type -> Type) #

The ability to run any monadic action m a as IO a.

This is more precisely a natural transformation. We need to new datatype (instead of simply using a forall) due to lack of support in GHC for impredicative types.

Since: unliftio-core-0.1.0.0

Constructors

UnliftIO 

Fields

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 TBChan a #

TBChan is an abstract type representing a bounded FIFO channel.

newTBChan :: Int -> STM (TBChan a) #

Build and returns a new instance of TBChan with the given capacity. N.B., we do not verify the capacity is positive, but if it is non-positive then writeTBChan will always retry and isFullTBChan will always be true.

newTBChanIO :: Int -> IO (TBChan a) #

IO version of newTBChan. This is useful for creating top-level TBChans using unsafePerformIO, because using atomically inside unsafePerformIO isn't possible.

readTBChan :: TBChan a -> STM a #

Read the next value from the TBChan, retrying if the channel is empty.

tryReadTBChan :: TBChan a -> STM (Maybe a) #

A version of readTBChan which does not retry. Instead it returns Nothing if no value is available.

peekTBChan :: TBChan a -> STM a #

Get the next value from the TBChan without removing it, retrying if the channel is empty.

tryPeekTBChan :: TBChan a -> STM (Maybe a) #

A version of peekTBChan which does not retry. Instead it returns Nothing if no value is available.

writeTBChan :: TBChan a -> a -> STM () #

Write a value to a TBChan, retrying if the channel is full.

tryWriteTBChan :: TBChan a -> a -> STM Bool #

A version of writeTBChan which does not retry. Returns True if the value was successfully written, and False otherwise.

unGetTBChan :: TBChan a -> a -> STM () #

Put a data item back onto a channel, where it will be the next item read. N.B., this could allow the channel to temporarily become longer than the specified limit, which is necessary to ensure that the item is indeed the next one read.

isEmptyTBChan :: TBChan a -> STM Bool #

Returns True if the supplied TBChan is empty (i.e., has no elements). N.B., a TBChan can be both "empty" and "full" at the same time, if the initial limit was non-positive.

isFullTBChan :: TBChan a -> STM Bool #

Returns True if the supplied TBChan is full (i.e., is over its limit). N.B., a TBChan can be both "empty" and "full" at the same time, if the initial limit was non-positive. N.B., a TBChan may still be full after reading, if unGetTBChan was used to go over the initial limit.

This is equivalent to: liftM (<= 0) estimateFreeSlotsTBMChan

estimateFreeSlotsTBChan :: TBChan a -> STM Int #

Estimate the number of free slots. If the result is positive, then it's a minimum bound; if it's non-positive then it's exact. It will only be negative if the initial limit was negative or if unGetTBChan was used to go over the initial limit.

This function always contends with writers, but only contends with readers when it has to; compare against freeSlotsTBChan.

freeSlotsTBChan :: TBChan a -> STM Int #

Return the exact number of free slots. The result can be negative if the initial limit was negative or if unGetTBChan was used to go over the initial limit.

This function always contends with both readers and writers; compare against estimateFreeSlotsTBChan.

data TBMChan a #

TBMChan is an abstract type representing a bounded closeable FIFO channel.

newTBMChan :: Int -> STM (TBMChan a) #

Build and returns a new instance of TBMChan with the given capacity. N.B., we do not verify the capacity is positive, but if it is non-positive then writeTBMChan will always retry and isFullTBMChan will always be true.

newTBMChanIO :: Int -> IO (TBMChan a) #

IO version of newTBMChan. This is useful for creating top-level TBMChans using unsafePerformIO, because using atomically inside unsafePerformIO isn't possible.

readTBMChan :: TBMChan a -> STM (Maybe a) #

Read the next value from the TBMChan, retrying if the channel is empty (and not closed). We return Nothing immediately if the channel is closed and empty.

tryReadTBMChan :: TBMChan a -> STM (Maybe (Maybe a)) #

A version of readTBMChan which does not retry. Instead it returns Just Nothing if the channel is open but no value is available; it still returns Nothing if the channel is closed and empty.

peekTBMChan :: TBMChan a -> STM (Maybe a) #

Get the next value from the TBMChan without removing it, retrying if the channel is empty.

tryPeekTBMChan :: TBMChan a -> STM (Maybe (Maybe a)) #

A version of peekTBMChan which does not retry. Instead it returns Just Nothing if the channel is open but no value is available; it still returns Nothing if the channel is closed and empty.

writeTBMChan :: TBMChan a -> a -> STM () #

Write a value to a TBMChan, retrying if the channel is full. If the channel is closed then the value is silently discarded. Use isClosedTBMChan to determine if the channel is closed before writing, as needed.

tryWriteTBMChan :: TBMChan a -> a -> STM (Maybe Bool) #

A version of writeTBMChan which does not retry. Returns Just True if the value was successfully written, Just False if it could not be written (but the channel was open), and Nothing if it was discarded (i.e., the channel was closed).

unGetTBMChan :: TBMChan a -> a -> STM () #

Put a data item back onto a channel, where it will be the next item read. If the channel is closed then the value is silently discarded; you can use peekTBMChan to circumvent this in certain circumstances. N.B., this could allow the channel to temporarily become longer than the specified limit, which is necessary to ensure that the item is indeed the next one read.

closeTBMChan :: TBMChan a -> STM () #

Closes the TBMChan, preventing any further writes.

isClosedTBMChan :: TBMChan a -> STM Bool #

Returns True if the supplied TBMChan has been closed.

isEmptyTBMChan :: TBMChan a -> STM Bool #

Returns True if the supplied TBMChan is empty (i.e., has no elements). N.B., a TBMChan can be both "empty" and "full" at the same time, if the initial limit was non-positive.

isFullTBMChan :: TBMChan a -> STM Bool #

Returns True if the supplied TBMChan is full (i.e., is over its limit). N.B., a TBMChan can be both "empty" and "full" at the same time, if the initial limit was non-positive. N.B., a TBMChan may still be full after reading, if unGetTBMChan was used to go over the initial limit.

This is equivalent to: liftM (<= 0) estimateFreeSlotsTBMChan

estimateFreeSlotsTBMChan :: TBMChan a -> STM Int #

Estimate the number of free slots. If the result is positive, then it's a minimum bound; if it's non-positive then it's exact. It will only be negative if the initial limit was negative or if unGetTBMChan was used to go over the initial limit.

This function always contends with writers, but only contends with readers when it has to; compare against freeSlotsTBMChan.

freeSlotsTBMChan :: TBMChan a -> STM Int #

Return the exact number of free slots. The result can be negative if the initial limit was negative or if unGetTBMChan was used to go over the initial limit.

This function always contends with both readers and writers; compare against estimateFreeSlotsTBMChan.

data TBMQueue a #

TBMQueue is an abstract type representing a bounded closeable FIFO queue.

newTBMQueue :: Int -> STM (TBMQueue a) #

Build and returns a new instance of TBMQueue with the given capacity. N.B., we do not verify the capacity is positive, but if it is non-positive then writeTBMQueue will always retry and isFullTBMQueue will always be true.

newTBMQueueIO :: Int -> IO (TBMQueue a) #

IO version of newTBMQueue. This is useful for creating top-level TBMQueues using unsafePerformIO, because using atomically inside unsafePerformIO isn't possible.

readTBMQueue :: TBMQueue a -> STM (Maybe a) #

Read the next value from the TBMQueue, retrying if the queue is empty (and not closed). We return Nothing immediately if the queue is closed and empty.

tryReadTBMQueue :: TBMQueue a -> STM (Maybe (Maybe a)) #

A version of readTBMQueue which does not retry. Instead it returns Just Nothing if the queue is open but no value is available; it still returns Nothing if the queue is closed and empty.

peekTBMQueue :: TBMQueue a -> STM (Maybe a) #

Get the next value from the TBMQueue without removing it, retrying if the queue is empty.

tryPeekTBMQueue :: TBMQueue a -> STM (Maybe (Maybe a)) #

A version of peekTBMQueue which does not retry. Instead it returns Just Nothing if the queue is open but no value is available; it still returns Nothing if the queue is closed and empty.

writeTBMQueue :: TBMQueue a -> a -> STM () #

Write a value to a TBMQueue, retrying if the queue is full. If the queue is closed then the value is silently discarded. Use isClosedTBMQueue to determine if the queue is closed before writing, as needed.

tryWriteTBMQueue :: TBMQueue a -> a -> STM (Maybe Bool) #

A version of writeTBMQueue which does not retry. Returns Just True if the value was successfully written, Just False if it could not be written (but the queue was open), and Nothing if it was discarded (i.e., the queue was closed).

unGetTBMQueue :: TBMQueue a -> a -> STM () #

Put a data item back onto a queue, where it will be the next item read. If the queue is closed then the value is silently discarded; you can use peekTBMQueue to circumvent this in certain circumstances. N.B., this could allow the queue to temporarily become longer than the specified limit, which is necessary to ensure that the item is indeed the next one read.

closeTBMQueue :: TBMQueue a -> STM () #

Closes the TBMQueue, preventing any further writes.

isClosedTBMQueue :: TBMQueue a -> STM Bool #

Returns True if the supplied TBMQueue has been closed.

isEmptyTBMQueue :: TBMQueue a -> STM Bool #

Returns True if the supplied TBMQueue is empty (i.e., has no elements). N.B., a TBMQueue can be both "empty" and "full" at the same time, if the initial limit was non-positive.

isFullTBMQueue :: TBMQueue a -> STM Bool #

Returns True if the supplied TBMQueue is full (i.e., is over its limit). N.B., a TBMQueue can be both "empty" and "full" at the same time, if the initial limit was non-positive. N.B., a TBMQueue may still be full after reading, if unGetTBMQueue was used to go over the initial limit.

This is equivalent to: liftM (<= 0) estimateFreeSlotsTBMQueue

estimateFreeSlotsTBMQueue :: TBMQueue a -> STM Int #

Estimate the number of free slots. If the result is positive, then it's a minimum bound; if it's non-positive then it's exact. It will only be negative if the initial limit was negative or if unGetTBMQueue was used to go over the initial limit.

This function always contends with writers, but only contends with readers when it has to; compare against freeSlotsTBMQueue.

freeSlotsTBMQueue :: TBMQueue a -> STM Int #

Return the exact number of free slots. The result can be negative if the initial limit was negative or if unGetTBMQueue was used to go over the initial limit.

This function always contends with both readers and writers; compare against estimateFreeSlotsTBMQueue.

data TMChan a #

TMChan is an abstract type representing a closeable FIFO channel.

newTMChan :: STM (TMChan a) #

Build and returns a new instance of TMChan.

newTMChanIO :: IO (TMChan a) #

IO version of newTMChan. This is useful for creating top-level TMChans using unsafePerformIO, because using atomically inside unsafePerformIO isn't possible.

newBroadcastTMChanIO :: IO (TMChan a) #

IO version of newBroadcastTMChan.

Since: 2.1.0

dupTMChan :: TMChan a -> STM (TMChan a) #

Duplicate a TMChan: the duplicate channel begins empty, but data written to either channel from then on will be available from both, and closing one copy will close them all. Hence this creates a kind of broadcast channel, where data written by anyone is seen by everyone else.

readTMChan :: TMChan a -> STM (Maybe a) #

Read the next value from the TMChan, retrying if the channel is empty (and not closed). We return Nothing immediately if the channel is closed and empty.

tryReadTMChan :: TMChan a -> STM (Maybe (Maybe a)) #

A version of readTMChan which does not retry. Instead it returns Just Nothing if the channel is open but no value is available; it still returns Nothing if the channel is closed and empty.

peekTMChan :: TMChan a -> STM (Maybe a) #

Get the next value from the TMChan without removing it, retrying if the channel is empty.

tryPeekTMChan :: TMChan a -> STM (Maybe (Maybe a)) #

A version of peekTMChan which does not retry. Instead it returns Just Nothing if the channel is open but no value is available; it still returns Nothing if the channel is closed and empty.

writeTMChan :: TMChan a -> a -> STM () #

Write a value to a TMChan. If the channel is closed then the value is silently discarded. Use isClosedTMChan to determine if the channel is closed before writing, as needed.

unGetTMChan :: TMChan a -> a -> STM () #

Put a data item back onto a channel, where it will be the next item read. If the channel is closed then the value is silently discarded; you can use peekTMChan to circumvent this in certain circumstances.

closeTMChan :: TMChan a -> STM () #

Closes the TMChan, preventing any further writes.

isClosedTMChan :: TMChan a -> STM Bool #

Returns True if the supplied TMChan has been closed.

isEmptyTMChan :: TMChan a -> STM Bool #

Returns True if the supplied TMChan is empty.

data TMQueue a #

TMQueue is an abstract type representing a closeable FIFO queue.

newTMQueue :: STM (TMQueue a) #

Build and returns a new instance of TMQueue.

newTMQueueIO :: IO (TMQueue a) #

IO version of newTMQueue. This is useful for creating top-level TMQueues using unsafePerformIO, because using atomically inside unsafePerformIO isn't possible.

readTMQueue :: TMQueue a -> STM (Maybe a) #

Read the next value from the TMQueue, retrying if the queue is empty (and not closed). We return Nothing immediately if the queue is closed and empty.

tryReadTMQueue :: TMQueue a -> STM (Maybe (Maybe a)) #

A version of readTMQueue which does not retry. Instead it returns Just Nothing if the queue is open but no value is available; it still returns Nothing if the queue is closed and empty.

peekTMQueue :: TMQueue a -> STM (Maybe a) #

Get the next value from the TMQueue without removing it, retrying if the queue is empty.

tryPeekTMQueue :: TMQueue a -> STM (Maybe (Maybe a)) #

A version of peekTMQueue which does not retry. Instead it returns Just Nothing if the queue is open but no value is available; it still returns Nothing if the queue is closed and empty.

writeTMQueue :: TMQueue a -> a -> STM () #

Write a value to a TMQueue. If the queue is closed then the value is silently discarded. Use isClosedTMQueue to determine if the queue is closed before writing, as needed.

unGetTMQueue :: TMQueue a -> a -> STM () #

Put a data item back onto a queue, where it will be the next item read. If the queue is closed then the value is silently discarded; you can use peekTMQueue to circumvent this in certain circumstances.

closeTMQueue :: TMQueue a -> STM () #

Closes the TMQueue, preventing any further writes.

isClosedTMQueue :: TMQueue a -> STM Bool #

Returns True if the supplied TMQueue has been closed.

isEmptyTMQueue :: TMQueue a -> STM Bool #

Returns True if the supplied TMQueue is empty.

data TBQueue a #

TBQueue is an abstract type representing a bounded FIFO channel.

Since: stm-2.4

Instances

Instances details
Eq (TBQueue a) 
Instance details

Defined in Control.Concurrent.STM.TBQueue

Methods

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

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

newTBQueue #

Arguments

:: Natural

maximum number of elements the queue can hold

-> STM (TBQueue a) 

Builds and returns a new instance of TBQueue.

writeTBQueue :: TBQueue a -> a -> STM () #

Write a value to a TBQueue; blocks if the queue is full.

readTBQueue :: TBQueue a -> STM a #

Read the next value from the TBQueue.

tryReadTBQueue :: TBQueue a -> STM (Maybe a) #

A version of readTBQueue which does not retry. Instead it returns Nothing if no value is available.

peekTBQueue :: TBQueue a -> STM a #

Get the next value from the TBQueue without removing it, retrying if the channel is empty.

tryPeekTBQueue :: TBQueue a -> STM (Maybe a) #

A version of peekTBQueue which does not retry. Instead it returns Nothing if no value is available.

unGetTBQueue :: TBQueue a -> a -> STM () #

Put a data item back onto a channel, where it will be the next item read. Blocks if the queue is full.

isEmptyTBQueue :: TBQueue a -> STM Bool #

Returns True if the supplied TBQueue is empty.

isFullTBQueue :: TBQueue a -> STM Bool #

Returns True if the supplied TBQueue is full.

Since: stm-2.4.3

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 #

newTChan :: STM (TChan a) #

Build and return a new instance of TChan

newBroadcastTChan :: STM (TChan a) #

Create a write-only TChan. More precisely, readTChan will retry even after items have been written to the channel. The only way to read a broadcast channel is to duplicate it with dupTChan.

Consider a server that broadcasts messages to clients:

serve :: TChan Message -> Client -> IO loop
serve broadcastChan client = do
    myChan <- dupTChan broadcastChan
    forever $ do
        message <- readTChan myChan
        send client message

The problem with using newTChan to create the broadcast channel is that if it is only written to and never read, items will pile up in memory. By using newBroadcastTChan to create the broadcast channel, items can be garbage collected after clients have seen them.

Since: stm-2.4

writeTChan :: TChan a -> a -> STM () #

Write a value to a TChan.

readTChan :: TChan a -> STM a #

Read the next value from the TChan.

tryReadTChan :: TChan a -> STM (Maybe a) #

A version of readTChan which does not retry. Instead it returns Nothing if no value is available.

Since: stm-2.3

peekTChan :: TChan a -> STM a #

Get the next value from the TChan without removing it, retrying if the channel is empty.

Since: stm-2.3

tryPeekTChan :: TChan a -> STM (Maybe a) #

A version of peekTChan which does not retry. Instead it returns Nothing if no value is available.

Since: stm-2.3

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.

unGetTChan :: TChan a -> a -> STM () #

Put a data item back onto a channel, where it will be the next item read.

isEmptyTChan :: TChan a -> STM Bool #

Returns True if the supplied TChan is empty.

cloneTChan :: TChan a -> STM (TChan a) #

Clone a TChan: similar to dupTChan, but the cloned channel starts with the same content available as the original channel.

Since: stm-2.4

data TMVar a #

A TMVar is a synchronising variable, used for communication between concurrent threads. It can be thought of as a box, which may be empty or full.

Instances

Instances details
Eq (TMVar a) 
Instance details

Defined in Control.Concurrent.STM.TMVar

Methods

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

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

newTMVar :: a -> STM (TMVar a) #

Create a TMVar which contains the supplied value.

newEmptyTMVar :: STM (TMVar a) #

Create a TMVar which is initially empty.

takeTMVar :: TMVar a -> STM a #

Return the contents of the TMVar. If the TMVar is currently empty, the transaction will retry. After a takeTMVar, the TMVar is left empty.

tryTakeTMVar :: TMVar a -> STM (Maybe a) #

A version of takeTMVar that does not retry. The tryTakeTMVar function returns Nothing if the TMVar was empty, or Just a if the TMVar was full with contents a. After tryTakeTMVar, the TMVar is left empty.

putTMVar :: TMVar a -> a -> STM () #

Put a value into a TMVar. If the TMVar is currently full, putTMVar will retry.

tryPutTMVar :: TMVar a -> a -> STM Bool #

A version of putTMVar that does not retry. The tryPutTMVar function attempts to put the value a into the TMVar, returning True if it was successful, or False otherwise.

readTMVar :: TMVar a -> STM a #

This is a combination of takeTMVar and putTMVar; ie. it takes the value from the TMVar, puts it back, and also returns it.

tryReadTMVar :: TMVar a -> STM (Maybe a) #

A version of readTMVar which does not retry. Instead it returns Nothing if no value is available.

Since: stm-2.3

swapTMVar :: TMVar a -> a -> STM a #

Swap the contents of a TMVar for a new value.

isEmptyTMVar :: TMVar a -> STM Bool #

Check whether a given TMVar is empty.

data TQueue a #

TQueue is an abstract type representing an unbounded FIFO channel.

Since: stm-2.4

Instances

Instances details
Eq (TQueue a) 
Instance details

Defined in Control.Concurrent.STM.TQueue

Methods

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

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

newTQueue :: STM (TQueue a) #

Build and returns a new instance of TQueue

writeTQueue :: TQueue a -> a -> STM () #

Write a value to a TQueue.

readTQueue :: TQueue a -> STM a #

Read the next value from the TQueue.

tryReadTQueue :: TQueue a -> STM (Maybe a) #

A version of readTQueue which does not retry. Instead it returns Nothing if no value is available.

peekTQueue :: TQueue a -> STM a #

Get the next value from the TQueue without removing it, retrying if the channel is empty.

tryPeekTQueue :: TQueue a -> STM (Maybe a) #

A version of peekTQueue which does not retry. Instead it returns Nothing if no value is available.

unGetTQueue :: TQueue a -> a -> STM () #

Put a data item back onto a channel, where it will be the next item read.

isEmptyTQueue :: TQueue a -> STM Bool #

Returns True if the supplied TQueue is empty.

modifyTVar :: TVar a -> (a -> a) -> STM () #

Mutate the contents of a TVar. N.B., this version is non-strict.

Since: stm-2.3

modifyTVar' :: TVar a -> (a -> a) -> STM () #

Strict version of modifyTVar.

Since: stm-2.3

swapTVar :: TVar a -> a -> STM a #

Swap the contents of a TVar for a new value.

Since: stm-2.3

say :: MonadIO m => Text -> m () #

Send a Text to standard output, appending a newline, and chunking the data. By default, the chunk size is 2048 characters, so any messages below that size will be sent as one contiguous unit. If larger messages are used, it is possible for interleaving with other threads to occur.

Since: say-0.1.0.0

sayString :: MonadIO m => String -> m () #

Same as say, but operates on a String. Note that this will force the entire String into memory at once, and will fail for infinite Strings.

Since: say-0.1.0.0

sayShow :: (MonadIO m, Show a) => a -> m () #

Same as say, but for instances of Show.

If your Show instance generates infinite output, this will fail. However, an infinite result for show would generally be considered an invalid instance anyway.

Since: say-0.1.0.0

sayErr :: MonadIO m => Text -> m () #

Same as say, but data is sent to standard error.

Since: say-0.1.0.0

sayErrString :: MonadIO m => String -> m () #

Same as sayString, but data is sent to standard error.

Since: say-0.1.0.0

sayErrShow :: (MonadIO m, Show a) => a -> m () #

Same as sayShow, but data is sent to standard error.

Since: say-0.1.0.0

hSay :: MonadIO m => Handle -> Text -> m () #

Same as say, but data is sent to the provided Handle.

Since: say-0.1.0.0

hSayString :: MonadIO m => Handle -> String -> m () #

Same as sayString, but data is sent to the provided Handle.

Since: say-0.1.0.0

hSayShow :: (MonadIO m, Show a) => Handle -> a -> m () #

Same as sayShow, but data is sent to the provided Handle.

Since: say-0.1.0.0

newMutVar :: PrimMonad m => a -> m (MutVar (PrimState m) a) #

Create a new MutVar with the specified initial value.

readMutVar :: PrimMonad m => MutVar (PrimState m) a -> m a #

Read the value of a MutVar.

writeMutVar :: PrimMonad m => MutVar (PrimState m) a -> a -> m () #

Write a new value into a MutVar.

atomicModifyMutVar :: PrimMonad m => MutVar (PrimState m) a -> (a -> (a, b)) -> m b #

Atomically mutate the contents of a MutVar.

This function is useful for using MutVar in a safe way in a multithreaded program. If you only have one MutVar, then using atomicModifyMutVar to access and modify it will prevent race conditions.

Extending the atomicity to multiple MutVars is problematic, so if you need to do anything more complicated, using MVar instead is a good idea.

atomicModifyMutVar does not apply the function strictly. This means if a program calls atomicModifyMutVar many times, but seldom uses the value, thunks will pile up in memory resulting in a space leak. To avoid this problem, use atomicModifyMutVar' instead.

atomicModifyMutVar' :: PrimMonad m => MutVar (PrimState m) a -> (a -> (a, b)) -> m b #

Strict version of atomicModifyMutVar. This forces both the value stored in the MutVar as well as the value returned.

modifyMutVar :: PrimMonad m => MutVar (PrimState m) a -> (a -> a) -> m () #

Mutate the contents of a MutVar.

modifyMutVar does not apply the function strictly. This means if a program calls modifyMutVar many times, but seldom uses the value, thunks will pile up in memory resulting in a space leak. To avoid this problem, use modifyMutVar' instead.

modifyMutVar' :: PrimMonad m => MutVar (PrimState m) a -> (a -> a) -> m () #

Strict version of modifyMutVar.

class Prim a #

Class of types supporting primitive array operations. This includes interfacing with GC-managed memory (functions suffixed with ByteArray#) and interfacing with unmanaged memory (functions suffixed with Addr#). Endianness is platform-dependent.

Instances

Instances details
Prim CBool 
Instance details

Defined in Data.Primitive.Types

Prim CChar 
Instance details

Defined in Data.Primitive.Types

Prim CClock 
Instance details

Defined in Data.Primitive.Types

Prim CDouble 
Instance details

Defined in Data.Primitive.Types

Prim CFloat 
Instance details

Defined in Data.Primitive.Types

Prim CInt 
Instance details

Defined in Data.Primitive.Types

Prim CIntMax 
Instance details

Defined in Data.Primitive.Types

Prim CIntPtr 
Instance details

Defined in Data.Primitive.Types

Prim CLLong 
Instance details

Defined in Data.Primitive.Types

Prim CLong 
Instance details

Defined in Data.Primitive.Types

Prim CPtrdiff 
Instance details

Defined in Data.Primitive.Types

Prim CSChar 
Instance details

Defined in Data.Primitive.Types

Prim CSUSeconds 
Instance details

Defined in Data.Primitive.Types

Prim CShort 
Instance details

Defined in Data.Primitive.Types

Prim CSigAtomic 
Instance details

Defined in Data.Primitive.Types

Prim CSize 
Instance details

Defined in Data.Primitive.Types

Prim CTime 
Instance details

Defined in Data.Primitive.Types

Prim CUChar 
Instance details

Defined in Data.Primitive.Types

Prim CUInt 
Instance details

Defined in Data.Primitive.Types

Prim CUIntMax 
Instance details

Defined in Data.Primitive.Types

Prim CUIntPtr 
Instance details

Defined in Data.Primitive.Types

Prim CULLong 
Instance details

Defined in Data.Primitive.Types

Prim CULong 
Instance details

Defined in Data.Primitive.Types

Prim CUSeconds 
Instance details

Defined in Data.Primitive.Types

Prim CUShort 
Instance details

Defined in Data.Primitive.Types

Prim CWchar 
Instance details

Defined in Data.Primitive.Types

Prim IntPtr

Since: primitive-0.7.1.0

Instance details

Defined in Data.Primitive.Types

Prim WordPtr

Since: primitive-0.7.1.0

Instance details

Defined in Data.Primitive.Types

Prim Int16 
Instance details

Defined in Data.Primitive.Types

Prim Int32 
Instance details

Defined in Data.Primitive.Types

Prim Int64 
Instance details

Defined in Data.Primitive.Types

Prim Int8 
Instance details

Defined in Data.Primitive.Types

Prim Word16 
Instance details

Defined in Data.Primitive.Types

Prim Word32 
Instance details

Defined in Data.Primitive.Types

Prim Word64 
Instance details

Defined in Data.Primitive.Types

Prim CBlkCnt 
Instance details

Defined in Data.Primitive.Types

Prim CBlkSize 
Instance details

Defined in Data.Primitive.Types

Prim CCc 
Instance details

Defined in Data.Primitive.Types

Prim CClockId 
Instance details

Defined in Data.Primitive.Types

Prim CDev 
Instance details

Defined in Data.Primitive.Types

Prim CFsBlkCnt 
Instance details

Defined in Data.Primitive.Types

Prim CFsFilCnt 
Instance details

Defined in Data.Primitive.Types

Prim CGid 
Instance details

Defined in Data.Primitive.Types

Prim CId 
Instance details

Defined in Data.Primitive.Types

Prim CIno 
Instance details

Defined in Data.Primitive.Types

Prim CKey 
Instance details

Defined in Data.Primitive.Types

Prim CMode 
Instance details

Defined in Data.Primitive.Types

Prim CNlink 
Instance details

Defined in Data.Primitive.Types

Prim COff 
Instance details

Defined in Data.Primitive.Types

Prim CPid 
Instance details

Defined in Data.Primitive.Types

Prim CRLim 
Instance details

Defined in Data.Primitive.Types

Prim CSpeed 
Instance details

Defined in Data.Primitive.Types

Prim CSsize 
Instance details

Defined in Data.Primitive.Types

Prim CTcflag 
Instance details

Defined in Data.Primitive.Types

Prim CTimer 
Instance details

Defined in Data.Primitive.Types

Prim CUid 
Instance details

Defined in Data.Primitive.Types

Prim Fd 
Instance details

Defined in Data.Primitive.Types

Prim Day 
Instance details

Defined in Chronos

Prim DayOfMonth 
Instance details

Defined in Chronos

Prim DayOfYear 
Instance details

Defined in Chronos

Prim Month 
Instance details

Defined in Chronos

Prim Time 
Instance details

Defined in Chronos

Prim Int128 
Instance details

Defined in Data.WideWord.Int128

Prim Word128 
Instance details

Defined in Data.WideWord.Word128

Prim Word256 
Instance details

Defined in Data.WideWord.Word256

Prim Word8 
Instance details

Defined in Data.Primitive.Types

Prim Char 
Instance details

Defined in Data.Primitive.Types

Prim Double 
Instance details

Defined in Data.Primitive.Types

Prim Float 
Instance details

Defined in Data.Primitive.Types

Prim Int 
Instance details

Defined in Data.Primitive.Types

Prim Word 
Instance details

Defined in Data.Primitive.Types

Prim a => Prim (Identity a)

Since: primitive-0.6.5.0

Instance details

Defined in Data.Primitive.Types

Prim a => Prim (Down a)

Since: primitive-0.6.5.0

Instance details

Defined in Data.Primitive.Types

Prim a => Prim (First a)

Since: primitive-0.6.5.0

Instance details

Defined in Data.Primitive.Types

Prim a => Prim (Last a)

Since: primitive-0.6.5.0

Instance details

Defined in Data.Primitive.Types

Prim a => Prim (Max a)

Since: primitive-0.6.5.0

Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: Max a -> Int# #

alignment# :: Max a -> Int# #

indexByteArray# :: ByteArray# -> Int# -> Max a #

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, Max a #) #

writeByteArray# :: MutableByteArray# s -> Int# -> Max a -> State# s -> State# s #

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> Max a -> State# s -> State# s #

indexOffAddr# :: Addr# -> Int# -> Max a #

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, Max a #) #

writeOffAddr# :: Addr# -> Int# -> Max a -> State# s -> State# s #

setOffAddr# :: Addr# -> Int# -> Int# -> Max a -> State# s -> State# s #

Prim a => Prim (Min a)

Since: primitive-0.6.5.0

Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: Min a -> Int# #

alignment# :: Min a -> Int# #

indexByteArray# :: ByteArray# -> Int# -> Min a #

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, Min a #) #

writeByteArray# :: MutableByteArray# s -> Int# -> Min a -> State# s -> State# s #

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> Min a -> State# s -> State# s #

indexOffAddr# :: Addr# -> Int# -> Min a #

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, Min a #) #

writeOffAddr# :: Addr# -> Int# -> Min a -> State# s -> State# s #

setOffAddr# :: Addr# -> Int# -> Int# -> Min a -> State# s -> State# s #

Prim a => Prim (Dual a)

Since: primitive-0.6.5.0

Instance details

Defined in Data.Primitive.Types

Prim a => Prim (Product a)

Since: primitive-0.6.5.0

Instance details

Defined in Data.Primitive.Types

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 #

Prim (FunPtr a) 
Instance details

Defined in Data.Primitive.Types

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 #

Prim (StablePtr a) 
Instance details

Defined in Data.Primitive.Types

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 #

data MutVar s a #

A MutVar behaves like a single-element mutable array associated with a primitive state token.

Constructors

MutVar (MutVar# s a) 

Instances

Instances details
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 #

MutableAtomicRef (MutVar s a) 
Instance details

Defined in Data.Mutable.Class

Methods

atomicModifyRef :: (PrimMonad m, PrimState m ~ MCState (MutVar s a)) => MutVar s a -> (RefElement (MutVar s a) -> (RefElement (MutVar s a), a0)) -> m a0 #

atomicModifyRef' :: (PrimMonad m, PrimState m ~ MCState (MutVar s a)) => MutVar s a -> (RefElement (MutVar s a) -> (RefElement (MutVar s a), a0)) -> m a0 #

Monoid w => MutableCollection (MutVar s w) 
Instance details

Defined in Data.Mutable.Class

Associated Types

type CollElement (MutVar s w) #

Methods

newColl :: (PrimMonad m, PrimState m ~ MCState (MutVar s w)) => m (MutVar s w) #

MutableContainer (MutVar s a) 
Instance details

Defined in Data.Mutable.Class

Associated Types

type MCState (MutVar s a) #

IsSequence a => MutablePopBack (MutVar s a) 
Instance details

Defined in Data.Mutable.Class

Methods

popBack :: (PrimMonad m, PrimState m ~ MCState (MutVar s a)) => MutVar s a -> m (Maybe (CollElement (MutVar s a))) #

IsSequence a => MutablePopFront (MutVar s a) 
Instance details

Defined in Data.Mutable.Class

Methods

popFront :: (PrimMonad m, PrimState m ~ MCState (MutVar s a)) => MutVar s a -> m (Maybe (CollElement (MutVar s a))) #

IsSequence a => MutablePushBack (MutVar s a) 
Instance details

Defined in Data.Mutable.Class

Methods

pushBack :: (PrimMonad m, PrimState m ~ MCState (MutVar s a)) => MutVar s a -> CollElement (MutVar s a) -> m () #

IsSequence a => MutablePushFront (MutVar s a) 
Instance details

Defined in Data.Mutable.Class

Methods

pushFront :: (PrimMonad m, PrimState m ~ MCState (MutVar s a)) => MutVar s a -> CollElement (MutVar s a) -> m () #

MutableRef (MutVar s a) 
Instance details

Defined in Data.Mutable.Class

Associated Types

type RefElement (MutVar s a) #

Methods

newRef :: (PrimMonad m, PrimState m ~ MCState (MutVar s a)) => RefElement (MutVar s a) -> m (MutVar s a) #

readRef :: (PrimMonad m, PrimState m ~ MCState (MutVar s a)) => MutVar s a -> m (RefElement (MutVar s a)) #

writeRef :: (PrimMonad m, PrimState m ~ MCState (MutVar s a)) => MutVar s a -> RefElement (MutVar s a) -> m () #

modifyRef :: (PrimMonad m, PrimState m ~ MCState (MutVar s a)) => MutVar s a -> (RefElement (MutVar s a) -> RefElement (MutVar s a)) -> m () #

modifyRef' :: (PrimMonad m, PrimState m ~ MCState (MutVar s a)) => MutVar s a -> (RefElement (MutVar s a) -> RefElement (MutVar s a)) -> m () #

type CollElement (MutVar s w) 
Instance details

Defined in Data.Mutable.Class

type CollElement (MutVar s w) = Element w
type MCState (MutVar s a) 
Instance details

Defined in Data.Mutable.Class

type MCState (MutVar s a) = s
type RefElement (MutVar s a) 
Instance details

Defined in Data.Mutable.Class

type RefElement (MutVar s a) = a

type family PrimState (m :: Type -> Type) #

State token type.

Instances

Instances details
type PrimState IO 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ST s) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ST s) = s
type PrimState (ST s) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ST s) = s
type PrimState (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

type PrimState (ListT m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (MaybeT m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (HandlerFor site) 
Instance details

Defined in Yesod.Core.Types

type PrimState (WidgetFor site) 
Instance details

Defined in Yesod.Core.Types

type PrimState (AccumT w m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (AccumT w m) = PrimState m
type PrimState (ErrorT e m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ErrorT e m) = PrimState m
type PrimState (ExceptT e m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ExceptT e m) = PrimState m
type PrimState (IdentityT m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ReaderT r m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ReaderT r m) = PrimState m
type PrimState (SelectT r m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (SelectT r m) = PrimState m
type PrimState (StateT s m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (StateT s m) = PrimState m
type PrimState (StateT s m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (StateT s m) = PrimState m
type PrimState (WriterT w m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (WriterT w m) = PrimState m
type PrimState (WriterT w m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (WriterT w m) = PrimState m
type PrimState (WriterT w m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (WriterT w m) = PrimState m
type PrimState (ConduitT i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

type PrimState (ConduitT i o m) = PrimState m
type PrimState (ContT r m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ContT r m) = PrimState m
type PrimState (RWST r w s m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (RWST r w s m) = PrimState m
type PrimState (RWST r w s m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (RWST r w s m) = PrimState m
type PrimState (RWST r w s m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (RWST r w s m) = PrimState m
type PrimState (Pipe l i o u m) 
Instance details

Defined in Data.Conduit.Internal.Pipe

type PrimState (Pipe l i o u m) = PrimState m

class Monad m => PrimMonad (m :: Type -> Type) where #

Class of monads which can perform primitive state-transformer actions.

Associated Types

type PrimState (m :: Type -> Type) #

State token type.

Methods

primitive :: (State# (PrimState m) -> (# State# (PrimState m), a #)) -> m a #

Execute a primitive operation.

Instances

Instances details
PrimMonad IO 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState IO #

Methods

primitive :: (State# (PrimState IO) -> (# State# (PrimState IO), a #)) -> IO a #

PrimMonad (ST s) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (ST s) #

Methods

primitive :: (State# (PrimState (ST s)) -> (# State# (PrimState (ST s)), a #)) -> ST s a #

PrimMonad (ST s) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (ST s) #

Methods

primitive :: (State# (PrimState (ST s)) -> (# State# (PrimState (ST s)), a #)) -> ST s a #

PrimMonad m => PrimMonad (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Associated Types

type PrimState (ResourceT m) #

Methods

primitive :: (State# (PrimState (ResourceT m)) -> (# State# (PrimState (ResourceT m)), a #)) -> ResourceT m a #

PrimMonad m => PrimMonad (ListT m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (ListT m) #

Methods

primitive :: (State# (PrimState (ListT m)) -> (# State# (PrimState (ListT m)), a #)) -> ListT m a #

PrimMonad m => PrimMonad (MaybeT m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (MaybeT m) #

Methods

primitive :: (State# (PrimState (MaybeT m)) -> (# State# (PrimState (MaybeT m)), a #)) -> MaybeT m a #

PrimMonad (HandlerFor site)

Since: yesod-core-1.6.7

Instance details

Defined in Yesod.Core.Types

Associated Types

type PrimState (HandlerFor site) #

Methods

primitive :: (State# (PrimState (HandlerFor site)) -> (# State# (PrimState (HandlerFor site)), a #)) -> HandlerFor site a #

PrimMonad (WidgetFor site)

Since: yesod-core-1.6.7

Instance details

Defined in Yesod.Core.Types

Associated Types

type PrimState (WidgetFor site) #

Methods

primitive :: (State# (PrimState (WidgetFor site)) -> (# State# (PrimState (WidgetFor site)), a #)) -> WidgetFor site a #

(Monoid w, PrimMonad m) => PrimMonad (AccumT w m)

Since: primitive-0.6.3.0

Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (AccumT w m) #

Methods

primitive :: (State# (PrimState (AccumT w m)) -> (# State# (PrimState (AccumT w m)), a #)) -> AccumT w m a #

(Error e, PrimMonad m) => PrimMonad (ErrorT e m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (ErrorT e m) #

Methods

primitive :: (State# (PrimState (ErrorT e m)) -> (# State# (PrimState (ErrorT e m)), a #)) -> ErrorT e m a #

PrimMonad m => PrimMonad (ExceptT e m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (ExceptT e m) #

Methods

primitive :: (State# (PrimState (ExceptT e m)) -> (# State# (PrimState (ExceptT e m)), a #)) -> ExceptT e m a #

PrimMonad m => PrimMonad (IdentityT m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (IdentityT m) #

Methods

primitive :: (State# (PrimState (IdentityT m)) -> (# State# (PrimState (IdentityT m)), a #)) -> IdentityT m a #

PrimMonad m => PrimMonad (ReaderT r m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (ReaderT r m) #

Methods

primitive :: (State# (PrimState (ReaderT r m)) -> (# State# (PrimState (ReaderT r m)), a #)) -> ReaderT r m a #

PrimMonad m => PrimMonad (SelectT r m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (SelectT r m) #

Methods

primitive :: (State# (PrimState (SelectT r m)) -> (# State# (PrimState (SelectT r m)), a #)) -> SelectT r m a #

PrimMonad m => PrimMonad (StateT s m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (StateT s m) #

Methods

primitive :: (State# (PrimState (StateT s m)) -> (# State# (PrimState (StateT s m)), a #)) -> StateT s m a #

PrimMonad m => PrimMonad (StateT s m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (StateT s m) #

Methods

primitive :: (State# (PrimState (StateT s m)) -> (# State# (PrimState (StateT s m)), a #)) -> StateT s m a #

(Monoid w, PrimMonad m) => PrimMonad (WriterT w m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (WriterT w m) #

Methods

primitive :: (State# (PrimState (WriterT w m)) -> (# State# (PrimState (WriterT w m)), a #)) -> WriterT w m a #

(Monoid w, PrimMonad m) => PrimMonad (WriterT w m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (WriterT w m) #

Methods

primitive :: (State# (PrimState (WriterT w m)) -> (# State# (PrimState (WriterT w m)), a #)) -> WriterT w m a #

(Monoid w, PrimMonad m) => PrimMonad (WriterT w m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (WriterT w m) #

Methods

primitive :: (State# (PrimState (WriterT w m)) -> (# State# (PrimState (WriterT w m)), a #)) -> WriterT w m a #

PrimMonad m => PrimMonad (ConduitT i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Associated Types

type PrimState (ConduitT i o m) #

Methods

primitive :: (State# (PrimState (ConduitT i o m)) -> (# State# (PrimState (ConduitT i o m)), a #)) -> ConduitT i o m a #

PrimMonad m => PrimMonad (ContT r m)

Since: primitive-0.6.3.0

Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (ContT r m) #

Methods

primitive :: (State# (PrimState (ContT r m)) -> (# State# (PrimState (ContT r m)), a #)) -> ContT r m a #

(Monoid w, PrimMonad m) => PrimMonad (RWST r w s m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (RWST r w s m) #

Methods

primitive :: (State# (PrimState (RWST r w s m)) -> (# State# (PrimState (RWST r w s m)), a #)) -> RWST r w s m a #

(Monoid w, PrimMonad m) => PrimMonad (RWST r w s m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (RWST r w s m) #

Methods

primitive :: (State# (PrimState (RWST r w s m)) -> (# State# (PrimState (RWST r w s m)), a #)) -> RWST r w s m a #

(Monoid w, PrimMonad m) => PrimMonad (RWST r w s m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (RWST r w s m) #

Methods

primitive :: (State# (PrimState (RWST r w s m)) -> (# State# (PrimState (RWST r w s m)), a #)) -> RWST r w s m a #

PrimMonad m => PrimMonad (Pipe l i o u m) 
Instance details

Defined in Data.Conduit.Internal.Pipe

Associated Types

type PrimState (Pipe l i o u m) #

Methods

primitive :: (State# (PrimState (Pipe l i o u m)) -> (# State# (PrimState (Pipe l i o u m)), a #)) -> Pipe l i o u m a #

type MutableDeque c = (MutableQueue c, MutablePushFront c, MutablePopBack c) #

Collections which allow pushing and popping at the front and back.

Since 0.2.0

type MutableStack c = (MutablePopFront c, MutablePushFront c) #

Collections which allow pushing at the back and popping at the front (aka FILOs).

Since 0.2.0

type MutableQueue c = (MutablePopFront c, MutablePushBack c) #

Collections which allow pushing and popping at the front (aka FIFOs).

Since 0.2.0

class MutableCollection c => MutablePushBack c where #

Place a value at the back of the collection.

Since 0.2.0

Methods

pushBack :: (PrimMonad m, PrimState m ~ MCState c) => c -> CollElement c -> m () #

Place a value at the back of the collection.

Since 0.2.0

Instances

Instances details
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 => MutablePushBack (STRef s a) 
Instance details

Defined in Data.Mutable.Class

Methods

pushBack :: (PrimMonad m, PrimState m ~ MCState (STRef s a)) => STRef s a -> CollElement (STRef s a) -> m () #

IsSequence seq => MutablePushBack (BRef s seq) 
Instance details

Defined in Data.Mutable.BRef

Methods

pushBack :: (PrimMonad m, PrimState m ~ MCState (BRef s seq)) => BRef s seq -> CollElement (BRef s seq) -> m () #

MutablePushBack (DLList s a) 
Instance details

Defined in Data.Mutable.DLList

Methods

pushBack :: (PrimMonad m, PrimState m ~ MCState (DLList s a)) => DLList s a -> CollElement (DLList s a) -> m () #

IsSequence a => MutablePushBack (MutVar s a) 
Instance details

Defined in Data.Mutable.Class

Methods

pushBack :: (PrimMonad m, PrimState m ~ MCState (MutVar s a)) => MutVar s a -> CollElement (MutVar s a) -> m () #

MVector v a => MutablePushBack (Deque v s a) 
Instance details

Defined in Data.Mutable.Deque

Methods

pushBack :: (PrimMonad m, PrimState m ~ MCState (Deque v s a)) => Deque v s a -> CollElement (Deque v s a) -> m () #

class MutableCollection c => MutablePopBack c where #

Take a value from the back of the collection, if available.

Since 0.2.0

Methods

popBack :: (PrimMonad m, PrimState m ~ MCState c) => c -> m (Maybe (CollElement c)) #

Take a value from the back of the collection, if available.

Since 0.2.0

Instances

Instances details
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 => MutablePopBack (STRef s a) 
Instance details

Defined in Data.Mutable.Class

Methods

popBack :: (PrimMonad m, PrimState m ~ MCState (STRef s a)) => STRef s a -> m (Maybe (CollElement (STRef s a))) #

IsSequence seq => MutablePopBack (BRef s seq) 
Instance details

Defined in Data.Mutable.BRef

Methods

popBack :: (PrimMonad m, PrimState m ~ MCState (BRef s seq)) => BRef s seq -> m (Maybe (CollElement (BRef s seq))) #

MutablePopBack (DLList s a) 
Instance details

Defined in Data.Mutable.DLList

Methods

popBack :: (PrimMonad m, PrimState m ~ MCState (DLList s a)) => DLList s a -> m (Maybe (CollElement (DLList s a))) #

IsSequence a => MutablePopBack (MutVar s a) 
Instance details

Defined in Data.Mutable.Class

Methods

popBack :: (PrimMonad m, PrimState m ~ MCState (MutVar s a)) => MutVar s a -> m (Maybe (CollElement (MutVar s a))) #

MVector v a => MutablePopBack (Deque v s a) 
Instance details

Defined in Data.Mutable.Deque

Methods

popBack :: (PrimMonad m, PrimState m ~ MCState (Deque v s a)) => Deque v s a -> m (Maybe (CollElement (Deque v s a))) #

class MutableCollection c => MutablePushFront c where #

Place a value at the front of the collection.

Since 0.2.0

Methods

pushFront :: (PrimMonad m, PrimState m ~ MCState c) => c -> CollElement c -> m () #

Place a value at the front of the collection.

Since 0.2.0

Instances

Instances details
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 () #

IsSequence a => MutablePushFront (STRef s a) 
Instance details

Defined in Data.Mutable.Class

Methods

pushFront :: (PrimMonad m, PrimState m ~ MCState (STRef s a)) => STRef s a -> CollElement (STRef s a) -> m () #

IsSequence seq => MutablePushFront (BRef s seq) 
Instance details

Defined in Data.Mutable.BRef

Methods

pushFront :: (PrimMonad m, PrimState m ~ MCState (BRef s seq)) => BRef s seq -> CollElement (BRef s seq) -> m () #

MutablePushFront (DLList s a) 
Instance details

Defined in Data.Mutable.DLList

Methods

pushFront :: (PrimMonad m, PrimState m ~ MCState (DLList s a)) => DLList s a -> CollElement (DLList s a) -> m () #

IsSequence a => MutablePushFront (MutVar s a) 
Instance details

Defined in Data.Mutable.Class

Methods

pushFront :: (PrimMonad m, PrimState m ~ MCState (MutVar s a)) => MutVar s a -> CollElement (MutVar s a) -> m () #

MVector v a => MutablePushFront (Deque v s a) 
Instance details

Defined in Data.Mutable.Deque

Methods

pushFront :: (PrimMonad m, PrimState m ~ MCState (Deque v s a)) => Deque v s a -> CollElement (Deque v s a) -> m () #

class MutableCollection c => MutablePopFront c where #

Take a value from the front of the collection, if available.

Since 0.2.0

Methods

popFront :: (PrimMonad m, PrimState m ~ MCState c) => c -> m (Maybe (CollElement c)) #

Take a value from the front of the collection, if available.

Since 0.2.0

Instances

Instances details
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 => MutablePopFront (STRef s a) 
Instance details

Defined in Data.Mutable.Class

Methods

popFront :: (PrimMonad m, PrimState m ~ MCState (STRef s a)) => STRef s a -> m (Maybe (CollElement (STRef s a))) #

IsSequence seq => MutablePopFront (BRef s seq) 
Instance details

Defined in Data.Mutable.BRef

Methods

popFront :: (PrimMonad m, PrimState m ~ MCState (BRef s seq)) => BRef s seq -> m (Maybe (CollElement (BRef s seq))) #

MutablePopFront (DLList s a) 
Instance details

Defined in Data.Mutable.DLList

Methods

popFront :: (PrimMonad m, PrimState m ~ MCState (DLList s a)) => DLList s a -> m (Maybe (CollElement (DLList s a))) #

IsSequence a => MutablePopFront (MutVar s a) 
Instance details

Defined in Data.Mutable.Class

Methods

popFront :: (PrimMonad m, PrimState m ~ MCState (MutVar s a)) => MutVar s a -> m (Maybe (CollElement (MutVar s a))) #

MVector v a => MutablePopFront (Deque v s a) 
Instance details

Defined in Data.Mutable.Deque

Methods

popFront :: (PrimMonad m, PrimState m ~ MCState (Deque v s a)) => Deque v s a -> m (Maybe (CollElement (Deque v s a))) #

class MutableContainer c => MutableCollection c where #

Containers which contain 0 or more values.

Since 0.2.0

Associated Types

type CollElement c #

The type of each value in the collection.

Since 0.2.0

Methods

newColl :: (PrimMonad m, PrimState m ~ MCState c) => m c #

Create a new, empty collection.

Since 0.2.0

Instances

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

Monoid w => MutableCollection (STRef s w) 
Instance details

Defined in Data.Mutable.Class

Associated Types

type CollElement (STRef s w) #

Methods

newColl :: (PrimMonad m, PrimState m ~ MCState (STRef s w)) => m (STRef s w) #

Monoid w => MutableCollection (BRef s w) 
Instance details

Defined in Data.Mutable.BRef

Associated Types

type CollElement (BRef s w) #

Methods

newColl :: (PrimMonad m, PrimState m ~ MCState (BRef s w)) => m (BRef s w) #

MutableCollection (DLList s a) 
Instance details

Defined in Data.Mutable.DLList

Associated Types

type CollElement (DLList s a) #

Methods

newColl :: (PrimMonad m, PrimState m ~ MCState (DLList s a)) => m (DLList s a) #

Monoid w => MutableCollection (MutVar s w) 
Instance details

Defined in Data.Mutable.Class

Associated Types

type CollElement (MutVar s w) #

Methods

newColl :: (PrimMonad m, PrimState m ~ MCState (MutVar s w)) => m (MutVar s w) #

MVector v a => MutableCollection (Deque v s a) 
Instance details

Defined in Data.Mutable.Deque

Associated Types

type CollElement (Deque v s a) #

Methods

newColl :: (PrimMonad m, PrimState m ~ MCState (Deque v s a)) => m (Deque v s a) #

type family CollElement c #

The type of each value in the collection.

Since 0.2.0

Instances

Instances details
type CollElement (IORef w) 
Instance details

Defined in Data.Mutable.Class

type CollElement (STRef s w) 
Instance details

Defined in Data.Mutable.Class

type CollElement (STRef s w) = Element w
type CollElement (BRef s w) 
Instance details

Defined in Data.Mutable.BRef

type CollElement (BRef s w) = Element w
type CollElement (DLList s a) 
Instance details

Defined in Data.Mutable.DLList

type CollElement (DLList s a) = a
type CollElement (MutVar s w) 
Instance details

Defined in Data.Mutable.Class

type CollElement (MutVar s w) = Element w
type CollElement (Deque v s a) 
Instance details

Defined in Data.Mutable.Deque

type CollElement (Deque v s a) = a

class MutableRef c => MutableAtomicRef c where #

MutableRefs that provide for atomic modifications of their contents.

Since 0.2.0

Methods

atomicModifyRef :: (PrimMonad m, PrimState m ~ MCState c) => c -> (RefElement c -> (RefElement c, a)) -> m a #

Modify the value without necessarily forcing the result.

Since 0.2.0

atomicModifyRef' :: (PrimMonad m, PrimState m ~ MCState c) => c -> (RefElement c -> (RefElement c, a)) -> m a #

Modify the value, forcing the result.

Since 0.2.0

Instances

Instances details
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 #

MutableAtomicRef (MutVar s a) 
Instance details

Defined in Data.Mutable.Class

Methods

atomicModifyRef :: (PrimMonad m, PrimState m ~ MCState (MutVar s a)) => MutVar s a -> (RefElement (MutVar s a) -> (RefElement (MutVar s a), a0)) -> m a0 #

atomicModifyRef' :: (PrimMonad m, PrimState m ~ MCState (MutVar s a)) => MutVar s a -> (RefElement (MutVar s a) -> (RefElement (MutVar s a), a0)) -> m a0 #

class MutableContainer c => MutableRef c where #

Typeclass for single-cell mutable references.

Since 0.2.0

Associated Types

type RefElement c #

Associated type giving the type of the value inside the mutable reference.

Since 0.2.0

Methods

newRef :: (PrimMonad m, PrimState m ~ MCState c) => RefElement c -> m c #

Create a new mutable reference with the given value.

Since 0.2.0

readRef :: (PrimMonad m, PrimState m ~ MCState c) => c -> m (RefElement c) #

Read the current value in the mutable reference.

Since 0.2.0

writeRef :: (PrimMonad m, PrimState m ~ MCState c) => c -> RefElement c -> m () #

Write a new value to the mutable reference.

Since 0.2.0

modifyRef :: (PrimMonad m, PrimState m ~ MCState c) => c -> (RefElement c -> RefElement c) -> m () #

Modify the value in the mutable reference, without necessarily forcing the result.

Note: some implementations will force the result, in particular PRef, SRef, and URef.

Since 0.2.0

modifyRef' :: (PrimMonad m, PrimState m ~ MCState c) => c -> (RefElement c -> RefElement c) -> m () #

Modify the value in the mutable reference, forcing the result.

Since 0.2.0

Instances

Instances details
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 () #

MutableRef (STRef s a) 
Instance details

Defined in Data.Mutable.Class

Associated Types

type RefElement (STRef s a) #

Methods

newRef :: (PrimMonad m, PrimState m ~ MCState (STRef s a)) => RefElement (STRef s a) -> m (STRef s a) #

readRef :: (PrimMonad m, PrimState m ~ MCState (STRef s a)) => STRef s a -> m (RefElement (STRef s a)) #

writeRef :: (PrimMonad m, PrimState m ~ MCState (STRef s a)) => STRef s a -> RefElement (STRef s a) -> m () #

modifyRef :: (PrimMonad m, PrimState m ~ MCState (STRef s a)) => STRef s a -> (RefElement (STRef s a) -> RefElement (STRef s a)) -> m () #

modifyRef' :: (PrimMonad m, PrimState m ~ MCState (STRef s a)) => STRef s a -> (RefElement (STRef s a) -> RefElement (STRef s a)) -> m () #

MutableRef (BRef s a) 
Instance details

Defined in Data.Mutable.BRef

Associated Types

type RefElement (BRef s a) #

Methods

newRef :: (PrimMonad m, PrimState m ~ MCState (BRef s a)) => RefElement (BRef s a) -> m (BRef s a) #

readRef :: (PrimMonad m, PrimState m ~ MCState (BRef s a)) => BRef s a -> m (RefElement (BRef s a)) #

writeRef :: (PrimMonad m, PrimState m ~ MCState (BRef s a)) => BRef s a -> RefElement (BRef s a) -> m () #

modifyRef :: (PrimMonad m, PrimState m ~ MCState (BRef s a)) => BRef s a -> (RefElement (BRef s a) -> RefElement (BRef s a)) -> m () #

modifyRef' :: (PrimMonad m, PrimState m ~ MCState (BRef s a)) => BRef s a -> (RefElement (BRef s a) -> RefElement (BRef s a)) -> m () #

Prim a => MutableRef (PRef s a) 
Instance details

Defined in Data.Mutable.PRef

Associated Types

type RefElement (PRef s a) #

Methods

newRef :: (PrimMonad m, PrimState m ~ MCState (PRef s a)) => RefElement (PRef s a) -> m (PRef s a) #

readRef :: (PrimMonad m, PrimState m ~ MCState (PRef s a)) => PRef s a -> m (RefElement (PRef s a)) #

writeRef :: (PrimMonad m, PrimState m ~ MCState (PRef s a)) => PRef s a -> RefElement (PRef s a) -> m () #

modifyRef :: (PrimMonad m, PrimState m ~ MCState (PRef s a)) => PRef s a -> (RefElement (PRef s a) -> RefElement (PRef s a)) -> m () #

modifyRef' :: (PrimMonad m, PrimState m ~ MCState (PRef s a)) => PRef s a -> (RefElement (PRef s a) -> RefElement (PRef s a)) -> m () #

Storable a => MutableRef (SRef s a) 
Instance details

Defined in Data.Mutable.SRef

Associated Types

type RefElement (SRef s a) #

Methods

newRef :: (PrimMonad m, PrimState m ~ MCState (SRef s a)) => RefElement (SRef s a) -> m (SRef s a) #

readRef :: (PrimMonad m, PrimState m ~ MCState (SRef s a)) => SRef s a -> m (RefElement (SRef s a)) #

writeRef :: (PrimMonad m, PrimState m ~ MCState (SRef s a)) => SRef s a -> RefElement (SRef s a) -> m () #

modifyRef :: (PrimMonad m, PrimState m ~ MCState (SRef s a)) => SRef s a -> (RefElement (SRef s a) -> RefElement (SRef s a)) -> m () #

modifyRef' :: (PrimMonad m, PrimState m ~ MCState (SRef s a)) => SRef s a -> (RefElement (SRef s a) -> RefElement (SRef s a)) -> m () #

Unbox a => MutableRef (URef s a) 
Instance details

Defined in Data.Mutable.URef

Associated Types

type RefElement (URef s a) #

Methods

newRef :: (PrimMonad m, PrimState m ~ MCState (URef s a)) => RefElement (URef s a) -> m (URef s a) #

readRef :: (PrimMonad m, PrimState m ~ MCState (URef s a)) => URef s a -> m (RefElement (URef s a)) #

writeRef :: (PrimMonad m, PrimState m ~ MCState (URef s a)) => URef s a -> RefElement (URef s a) -> m () #

modifyRef :: (PrimMonad m, PrimState m ~ MCState (URef s a)) => URef s a -> (RefElement (URef s a) -> RefElement (URef s a)) -> m () #

modifyRef' :: (PrimMonad m, PrimState m ~ MCState (URef s a)) => URef s a -> (RefElement (URef s a) -> RefElement (URef s a)) -> m () #

MutableRef (MutVar s a) 
Instance details

Defined in Data.Mutable.Class

Associated Types

type RefElement (MutVar s a) #

Methods

newRef :: (PrimMonad m, PrimState m ~ MCState (MutVar s a)) => RefElement (MutVar s a) -> m (MutVar s a) #

readRef :: (PrimMonad m, PrimState m ~ MCState (MutVar s a)) => MutVar s a -> m (RefElement (MutVar s a)) #

writeRef :: (PrimMonad m, PrimState m ~ MCState (MutVar s a)) => MutVar s a -> RefElement (MutVar s a) -> m () #

modifyRef :: (PrimMonad m, PrimState m ~ MCState (MutVar s a)) => MutVar s a -> (RefElement (MutVar s a) -> RefElement (MutVar s a)) -> m () #

modifyRef' :: (PrimMonad m, PrimState m ~ MCState (MutVar s a)) => MutVar s a -> (RefElement (MutVar s a) -> RefElement (MutVar s a)) -> m () #

type family RefElement c #

Associated type giving the type of the value inside the mutable reference.

Since 0.2.0

Instances

Instances details
type RefElement (IORef a) 
Instance details

Defined in Data.Mutable.Class

type RefElement (IORef a) = a
type RefElement (STRef s a) 
Instance details

Defined in Data.Mutable.Class

type RefElement (STRef s a) = a
type RefElement (BRef s a) 
Instance details

Defined in Data.Mutable.BRef

type RefElement (BRef s a) = a
type RefElement (PRef s a) 
Instance details

Defined in Data.Mutable.PRef

type RefElement (PRef s a) = a
type RefElement (SRef s a) 
Instance details

Defined in Data.Mutable.SRef

type RefElement (SRef s a) = a
type RefElement (URef s a) 
Instance details

Defined in Data.Mutable.URef

type RefElement (URef s a) = a
type RefElement (MutVar s a) 
Instance details

Defined in Data.Mutable.Class

type RefElement (MutVar s a) = a

class MutableContainer c #

The parent typeclass for all mutable containers.

Since 0.2.0

Associated Types

type MCState c #

Associated type giving the primitive state token for the given container, much like PrimState from primitive.

Since 0.2.0

Instances

Instances details
MutableContainer (IORef a) 
Instance details

Defined in Data.Mutable.Class

Associated Types

type MCState (IORef a) #

MutableContainer (STRef s a) 
Instance details

Defined in Data.Mutable.Class

Associated Types

type MCState (STRef s a) #

MutableContainer (BRef s a) 
Instance details

Defined in Data.Mutable.BRef

Associated Types

type MCState (BRef s a) #

MutableContainer (DLList s a) 
Instance details

Defined in Data.Mutable.DLList

Associated Types

type MCState (DLList s a) #

MutableContainer (PRef s a) 
Instance details

Defined in Data.Mutable.PRef

Associated Types

type MCState (PRef s a) #

MutableContainer (SRef s a) 
Instance details

Defined in Data.Mutable.SRef

Associated Types

type MCState (SRef s a) #

MutableContainer (URef s a) 
Instance details

Defined in Data.Mutable.URef

Associated Types

type MCState (URef s a) #

MutableContainer (MutVar s a) 
Instance details

Defined in Data.Mutable.Class

Associated Types

type MCState (MutVar s a) #

MutableContainer (Deque v s a) 
Instance details

Defined in Data.Mutable.Deque

Associated Types

type MCState (Deque v s a) #

type family MCState c #

Associated type giving the primitive state token for the given container, much like PrimState from primitive.

Since 0.2.0

Instances

Instances details
type MCState (IORef a) 
Instance details

Defined in Data.Mutable.Class

type MCState (STRef s a) 
Instance details

Defined in Data.Mutable.Class

type MCState (STRef s a) = s
type MCState (BRef s a) 
Instance details

Defined in Data.Mutable.BRef

type MCState (BRef s a) = s
type MCState (DLList s a) 
Instance details

Defined in Data.Mutable.DLList

type MCState (DLList s a) = s
type MCState (PRef s a) 
Instance details

Defined in Data.Mutable.PRef

type MCState (PRef s a) = s
type MCState (SRef s a) 
Instance details

Defined in Data.Mutable.SRef

type MCState (SRef s a) = s
type MCState (URef s a) 
Instance details

Defined in Data.Mutable.URef

type MCState (URef s a) = s
type MCState (MutVar s a) 
Instance details

Defined in Data.Mutable.Class

type MCState (MutVar s a) = s
type MCState (Deque v s a) 
Instance details

Defined in Data.Mutable.Deque

type MCState (Deque v s a) = s

asIORef :: IORef a -> IORef a #

Since 0.2.0

asSTRef :: STRef s a -> STRef s a #

Since 0.2.0

asMutVar :: MutVar s a -> MutVar s a #

Since 0.2.0

type IOBRef = BRef (PrimState IO) #

A boxed IO vector reference.

data BRef s a #

A boxed vector reference, supporting any monad.

Since 0.2.0

Instances

Instances details
Monoid w => MutableCollection (BRef s w) 
Instance details

Defined in Data.Mutable.BRef

Associated Types

type CollElement (BRef s w) #

Methods

newColl :: (PrimMonad m, PrimState m ~ MCState (BRef s w)) => m (BRef s w) #

MutableContainer (BRef s a) 
Instance details

Defined in Data.Mutable.BRef

Associated Types

type MCState (BRef s a) #

IsSequence seq => MutablePopBack (BRef s seq) 
Instance details

Defined in Data.Mutable.BRef

Methods

popBack :: (PrimMonad m, PrimState m ~ MCState (BRef s seq)) => BRef s seq -> m (Maybe (CollElement (BRef s seq))) #

IsSequence seq => MutablePopFront (BRef s seq) 
Instance details

Defined in Data.Mutable.BRef

Methods

popFront :: (PrimMonad m, PrimState m ~ MCState (BRef s seq)) => BRef s seq -> m (Maybe (CollElement (BRef s seq))) #

IsSequence seq => MutablePushBack (BRef s seq) 
Instance details

Defined in Data.Mutable.BRef

Methods

pushBack :: (PrimMonad m, PrimState m ~ MCState (BRef s seq)) => BRef s seq -> CollElement (BRef s seq) -> m () #

IsSequence seq => MutablePushFront (BRef s seq) 
Instance details

Defined in Data.Mutable.BRef

Methods

pushFront :: (PrimMonad m, PrimState m ~ MCState (BRef s seq)) => BRef s seq -> CollElement (BRef s seq) -> m () #

MutableRef (BRef s a) 
Instance details

Defined in Data.Mutable.BRef

Associated Types

type RefElement (BRef s a) #

Methods

newRef :: (PrimMonad m, PrimState m ~ MCState (BRef s a)) => RefElement (BRef s a) -> m (BRef s a) #

readRef :: (PrimMonad m, PrimState m ~ MCState (BRef s a)) => BRef s a -> m (RefElement (BRef s a)) #

writeRef :: (PrimMonad m, PrimState m ~ MCState (BRef s a)) => BRef s a -> RefElement (BRef s a) -> m () #

modifyRef :: (PrimMonad m, PrimState m ~ MCState (BRef s a)) => BRef s a -> (RefElement (BRef s a) -> RefElement (BRef s a)) -> m () #

modifyRef' :: (PrimMonad m, PrimState m ~ MCState (BRef s a)) => BRef s a -> (RefElement (BRef s a) -> RefElement (BRef s a)) -> m () #

type CollElement (BRef s w) 
Instance details

Defined in Data.Mutable.BRef

type CollElement (BRef s w) = Element w
type MCState (BRef s a) 
Instance details

Defined in Data.Mutable.BRef

type MCState (BRef s a) = s
type RefElement (BRef s a) 
Instance details

Defined in Data.Mutable.BRef

type RefElement (BRef s a) = a

asBRef :: BRef s a -> BRef s a #

Since 0.2.0

data DLList s a #

A doubly-linked list.

Since 0.3.0

Instances

Instances details
MutableCollection (DLList s a) 
Instance details

Defined in Data.Mutable.DLList

Associated Types

type CollElement (DLList s a) #

Methods

newColl :: (PrimMonad m, PrimState m ~ MCState (DLList s a)) => m (DLList s a) #

MutableContainer (DLList s a) 
Instance details

Defined in Data.Mutable.DLList

Associated Types

type MCState (DLList s a) #

MutablePopBack (DLList s a) 
Instance details

Defined in Data.Mutable.DLList

Methods

popBack :: (PrimMonad m, PrimState m ~ MCState (DLList s a)) => DLList s a -> m (Maybe (CollElement (DLList s a))) #

MutablePopFront (DLList s a) 
Instance details

Defined in Data.Mutable.DLList

Methods

popFront :: (PrimMonad m, PrimState m ~ MCState (DLList s a)) => DLList s a -> m (Maybe (CollElement (DLList s a))) #

MutablePushBack (DLList s a) 
Instance details

Defined in Data.Mutable.DLList

Methods

pushBack :: (PrimMonad m, PrimState m ~ MCState (DLList s a)) => DLList s a -> CollElement (DLList s a) -> m () #

MutablePushFront (DLList s a) 
Instance details

Defined in Data.Mutable.DLList

Methods

pushFront :: (PrimMonad m, PrimState m ~ MCState (DLList s a)) => DLList s a -> CollElement (DLList s a) -> m () #

type CollElement (DLList s a) 
Instance details

Defined in Data.Mutable.DLList

type CollElement (DLList s a) = a
type MCState (DLList s a) 
Instance details

Defined in Data.Mutable.DLList

type MCState (DLList s a) = s

asDLList :: DLList s a -> DLList s a #

Since 0.2.0

type BDeque = Deque MVector #

A Deque specialized to boxed vectors.

Since 0.2.0

type SDeque = Deque MVector #

A Deque specialized to storable vectors.

Since 0.2.0

type UDeque = Deque MVector #

A Deque specialized to unboxed vectors.

Since 0.2.0

data Deque (v :: Type -> Type -> Type) s a #

A double-ended queue supporting any underlying vector type and any monad.

This implements a circular double-ended queue with exponential growth.

Since 0.2.0

Instances

Instances details
MVector v a => MutableCollection (Deque v s a) 
Instance details

Defined in Data.Mutable.Deque

Associated Types

type CollElement (Deque v s a) #

Methods

newColl :: (PrimMonad m, PrimState m ~ MCState (Deque v s a)) => m (Deque v s a) #

MutableContainer (Deque v s a) 
Instance details

Defined in Data.Mutable.Deque

Associated Types

type MCState (Deque v s a) #

MVector v a => MutablePopBack (Deque v s a) 
Instance details

Defined in Data.Mutable.Deque

Methods

popBack :: (PrimMonad m, PrimState m ~ MCState (Deque v s a)) => Deque v s a -> m (Maybe (CollElement (Deque v s a))) #

MVector v a => MutablePopFront (Deque v s a) 
Instance details

Defined in Data.Mutable.Deque

Methods

popFront :: (PrimMonad m, PrimState m ~ MCState (Deque v s a)) => Deque v s a -> m (Maybe (CollElement (Deque v s a))) #

MVector v a => MutablePushBack (Deque v s a) 
Instance details

Defined in Data.Mutable.Deque

Methods

pushBack :: (PrimMonad m, PrimState m ~ MCState (Deque v s a)) => Deque v s a -> CollElement (Deque v s a) -> m () #

MVector v a => MutablePushFront (Deque v s a) 
Instance details

Defined in Data.Mutable.Deque

Methods

pushFront :: (PrimMonad m, PrimState m ~ MCState (Deque v s a)) => Deque v s a -> CollElement (Deque v s a) -> m () #

type CollElement (Deque v s a) 
Instance details

Defined in Data.Mutable.Deque

type CollElement (Deque v s a) = a
type MCState (Deque v s a) 
Instance details

Defined in Data.Mutable.Deque

type MCState (Deque v s a) = s

asUDeque :: UDeque s a -> UDeque s a #

Since 0.2.0

asSDeque :: SDeque s a -> SDeque s a #

Since 0.2.0

asBDeque :: BDeque s a -> BDeque s a #

Since 0.2.0

type IOPRef = PRef (PrimState IO) #

A primitive ByteArray IO reference.

data PRef s a #

A primitive ByteArray reference, supporting any monad.

Since 0.2.0

Instances

Instances details
MutableContainer (PRef s a) 
Instance details

Defined in Data.Mutable.PRef

Associated Types

type MCState (PRef s a) #

Prim a => MutableRef (PRef s a) 
Instance details

Defined in Data.Mutable.PRef

Associated Types

type RefElement (PRef s a) #

Methods

newRef :: (PrimMonad m, PrimState m ~ MCState (PRef s a)) => RefElement (PRef s a) -> m (PRef s a) #

readRef :: (PrimMonad m, PrimState m ~ MCState (PRef s a)) => PRef s a -> m (RefElement (PRef s a)) #

writeRef :: (PrimMonad m, PrimState m ~ MCState (PRef s a)) => PRef s a -> RefElement (PRef s a) -> m () #

modifyRef :: (PrimMonad m, PrimState m ~ MCState (PRef s a)) => PRef s a -> (RefElement (PRef s a) -> RefElement (PRef s a)) -> m () #

modifyRef' :: (PrimMonad m, PrimState m ~ MCState (PRef s a)) => PRef s a -> (RefElement (PRef s a) -> RefElement (PRef s a)) -> m () #

type MCState (PRef s a) 
Instance details

Defined in Data.Mutable.PRef

type MCState (PRef s a) = s
type RefElement (PRef s a) 
Instance details

Defined in Data.Mutable.PRef

type RefElement (PRef s a) = a

asPRef :: PRef s a -> PRef s a #

Since 0.2.0

type IOSRef = SRef (PrimState IO) #

A storable IO vector reference.

data SRef s a #

A storable vector reference, supporting any monad.

Since 0.2.0

Instances

Instances details
MutableContainer (SRef s a) 
Instance details

Defined in Data.Mutable.SRef

Associated Types

type MCState (SRef s a) #

Storable a => MutableRef (SRef s a) 
Instance details

Defined in Data.Mutable.SRef

Associated Types

type RefElement (SRef s a) #

Methods

newRef :: (PrimMonad m, PrimState m ~ MCState (SRef s a)) => RefElement (SRef s a) -> m (SRef s a) #

readRef :: (PrimMonad m, PrimState m ~ MCState (SRef s a)) => SRef s a -> m (RefElement (SRef s a)) #

writeRef :: (PrimMonad m, PrimState m ~ MCState (SRef s a)) => SRef s a -> RefElement (SRef s a) -> m () #

modifyRef :: (PrimMonad m, PrimState m ~ MCState (SRef s a)) => SRef s a -> (RefElement (SRef s a) -> RefElement (SRef s a)) -> m () #

modifyRef' :: (PrimMonad m, PrimState m ~ MCState (SRef s a)) => SRef s a -> (RefElement (SRef s a) -> RefElement (SRef s a)) -> m () #

type MCState (SRef s a) 
Instance details

Defined in Data.Mutable.SRef

type MCState (SRef s a) = s
type RefElement (SRef s a) 
Instance details

Defined in Data.Mutable.SRef

type RefElement (SRef s a) = a

asSRef :: SRef s a -> SRef s a #

Since 0.2.0

type IOURef = URef (PrimState IO) #

An unboxed IO vector reference.

data URef s a #

An unboxed vector reference, supporting any monad.

Since 0.2.0

Instances

Instances details
MutableContainer (URef s a) 
Instance details

Defined in Data.Mutable.URef

Associated Types

type MCState (URef s a) #

Unbox a => MutableRef (URef s a) 
Instance details

Defined in Data.Mutable.URef

Associated Types

type RefElement (URef s a) #

Methods

newRef :: (PrimMonad m, PrimState m ~ MCState (URef s a)) => RefElement (URef s a) -> m (URef s a) #

readRef :: (PrimMonad m, PrimState m ~ MCState (URef s a)) => URef s a -> m (RefElement (URef s a)) #

writeRef :: (PrimMonad m, PrimState m ~ MCState (URef s a)) => URef s a -> RefElement (URef s a) -> m () #

modifyRef :: (PrimMonad m, PrimState m ~ MCState (URef s a)) => URef s a -> (RefElement (URef s a) -> RefElement (URef s a)) -> m () #

modifyRef' :: (PrimMonad m, PrimState m ~ MCState (URef s a)) => URef s a -> (RefElement (URef s a) -> RefElement (URef s a)) -> m () #

type MCState (URef s a) 
Instance details

Defined in Data.Mutable.URef

type MCState (URef s a) = s
type RefElement (URef s a) 
Instance details

Defined in Data.Mutable.URef

type RefElement (URef s a) = a

asURef :: URef s a -> URef s a #

Since 0.2.0

data WrappedMono mono a where #

Provides a Foldable for an arbitrary MonoFoldable.

Since: mono-traversable-1.0.14.0

Constructors

WrappedMono :: forall mono a. Element mono ~ a => mono -> WrappedMono mono a 

Instances

Instances details
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 #

MonoFoldable mono => MonoFoldable (WrappedMono mono a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (WrappedMono mono a) -> m) -> WrappedMono mono a -> m #

ofoldr :: (Element (WrappedMono mono a) -> b -> b) -> b -> WrappedMono mono a -> b #

ofoldl' :: (a0 -> Element (WrappedMono mono a) -> a0) -> a0 -> WrappedMono mono a -> a0 #

otoList :: WrappedMono mono a -> [Element (WrappedMono mono a)] #

oall :: (Element (WrappedMono mono a) -> Bool) -> WrappedMono mono a -> Bool #

oany :: (Element (WrappedMono mono a) -> Bool) -> WrappedMono mono a -> Bool #

onull :: WrappedMono mono a -> Bool #

olength :: WrappedMono mono a -> Int #

olength64 :: WrappedMono mono a -> Int64 #

ocompareLength :: Integral i => WrappedMono mono a -> i -> Ordering #

otraverse_ :: Applicative f => (Element (WrappedMono mono a) -> f b) -> WrappedMono mono a -> f () #

ofor_ :: Applicative f => WrappedMono mono a -> (Element (WrappedMono mono a) -> f b) -> f () #

omapM_ :: Applicative m => (Element (WrappedMono mono a) -> m ()) -> WrappedMono mono a -> m () #

oforM_ :: Applicative m => WrappedMono mono a -> (Element (WrappedMono mono a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (WrappedMono mono a) -> m a0) -> a0 -> WrappedMono mono a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (WrappedMono mono a) -> m) -> WrappedMono mono a -> m #

ofoldr1Ex :: (Element (WrappedMono mono a) -> Element (WrappedMono mono a) -> Element (WrappedMono mono a)) -> WrappedMono mono a -> Element (WrappedMono mono a) #

ofoldl1Ex' :: (Element (WrappedMono mono a) -> Element (WrappedMono mono a) -> Element (WrappedMono mono a)) -> WrappedMono mono a -> Element (WrappedMono mono a) #

headEx :: WrappedMono mono a -> Element (WrappedMono mono a) #

lastEx :: WrappedMono mono a -> Element (WrappedMono mono a) #

unsafeHead :: WrappedMono mono a -> Element (WrappedMono mono a) #

unsafeLast :: WrappedMono mono a -> Element (WrappedMono mono a) #

maximumByEx :: (Element (WrappedMono mono a) -> Element (WrappedMono mono a) -> Ordering) -> WrappedMono mono a -> Element (WrappedMono mono a) #

minimumByEx :: (Element (WrappedMono mono a) -> Element (WrappedMono mono a) -> Ordering) -> WrappedMono mono a -> Element (WrappedMono mono a) #

oelem :: Element (WrappedMono mono a) -> WrappedMono mono a -> Bool #

onotElem :: Element (WrappedMono mono a) -> WrappedMono mono a -> Bool #

MonoFunctor mono => MonoFunctor (WrappedMono mono a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (WrappedMono mono a) -> Element (WrappedMono mono a)) -> WrappedMono mono a -> WrappedMono mono a #

(MonoPointed mono, Element mono ~ a) => MonoPointed (WrappedMono mono a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (WrappedMono mono a) -> WrappedMono mono a #

type Element (WrappedMono mono a) 
Instance details

Defined in Data.MonoTraversable

type Element (WrappedMono mono a) = Element mono

newtype WrappedPoly (f :: Type -> Type) a #

Provides a MonoFoldable, MonoFunctor or MonoPointed for an arbitrary Foldable, Functor or Applicative.

Useful for, e.g., passing a Foldable type you don't own into a function that expects a MonoFoldable.

// package A
data MyList a = MyList [a] deriving Foldable

// package B
process :: MonoFoldable mono => mono -> IO ()

// package C
process (WrappedPoly (MyList []))

Since: mono-traversable-1.0.13.0

Constructors

WrappedPoly 

Fields

Instances

Instances details
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 #

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 #

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 #

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 #

Foldable f => MonoFoldable (WrappedPoly f a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (WrappedPoly f a) -> m) -> WrappedPoly f a -> m #

ofoldr :: (Element (WrappedPoly f a) -> b -> b) -> b -> WrappedPoly f a -> b #

ofoldl' :: (a0 -> Element (WrappedPoly f a) -> a0) -> a0 -> WrappedPoly f a -> a0 #

otoList :: WrappedPoly f a -> [Element (WrappedPoly f a)] #

oall :: (Element (WrappedPoly f a) -> Bool) -> WrappedPoly f a -> Bool #

oany :: (Element (WrappedPoly f a) -> Bool) -> WrappedPoly f a -> Bool #

onull :: WrappedPoly f a -> Bool #

olength :: WrappedPoly f a -> Int #

olength64 :: WrappedPoly f a -> Int64 #

ocompareLength :: Integral i => WrappedPoly f a -> i -> Ordering #

otraverse_ :: Applicative f0 => (Element (WrappedPoly f a) -> f0 b) -> WrappedPoly f a -> f0 () #

ofor_ :: Applicative f0 => WrappedPoly f a -> (Element (WrappedPoly f a) -> f0 b) -> f0 () #

omapM_ :: Applicative m => (Element (WrappedPoly f a) -> m ()) -> WrappedPoly f a -> m () #

oforM_ :: Applicative m => WrappedPoly f a -> (Element (WrappedPoly f a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (WrappedPoly f a) -> m a0) -> a0 -> WrappedPoly f a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (WrappedPoly f a) -> m) -> WrappedPoly f a -> m #

ofoldr1Ex :: (Element (WrappedPoly f a) -> Element (WrappedPoly f a) -> Element (WrappedPoly f a)) -> WrappedPoly f a -> Element (WrappedPoly f a) #

ofoldl1Ex' :: (Element (WrappedPoly f a) -> Element (WrappedPoly f a) -> Element (WrappedPoly f a)) -> WrappedPoly f a -> Element (WrappedPoly f a) #

headEx :: WrappedPoly f a -> Element (WrappedPoly f a) #

lastEx :: WrappedPoly f a -> Element (WrappedPoly f a) #

unsafeHead :: WrappedPoly f a -> Element (WrappedPoly f a) #

unsafeLast :: WrappedPoly f a -> Element (WrappedPoly f a) #

maximumByEx :: (Element (WrappedPoly f a) -> Element (WrappedPoly f a) -> Ordering) -> WrappedPoly f a -> Element (WrappedPoly f a) #

minimumByEx :: (Element (WrappedPoly f a) -> Element (WrappedPoly f a) -> Ordering) -> WrappedPoly f a -> Element (WrappedPoly f a) #

oelem :: Element (WrappedPoly f a) -> WrappedPoly f a -> Bool #

onotElem :: Element (WrappedPoly f a) -> WrappedPoly f a -> Bool #

Functor f => MonoFunctor (WrappedPoly f a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (WrappedPoly f a) -> Element (WrappedPoly f a)) -> WrappedPoly f a -> WrappedPoly f a #

Applicative f => MonoPointed (WrappedPoly f a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (WrappedPoly f a) -> WrappedPoly f a #

type Element (WrappedPoly f a) 
Instance details

Defined in Data.MonoTraversable

type Element (WrappedPoly f a) = a

class MonoFoldable mono => GrowingAppend mono #

Containers which, when two values are combined, the combined length is no less than the larger of the two inputs. In code:

olength (x <> y) >= max (olength x) (olength y)

This class has no methods, and is simply used to assert that this law holds, in order to provide guarantees of correctness (see, for instance, Data.NonNull).

This should have a Semigroup superclass constraint, however, due to Semigroup only recently moving to base, some packages do not provide instances.

Instances

Instances details
GrowingAppend ByteString 
Instance details

Defined in Data.MonoTraversable

GrowingAppend ByteString 
Instance details

Defined in Data.MonoTraversable

GrowingAppend IntSet 
Instance details

Defined in Data.MonoTraversable

GrowingAppend Text 
Instance details

Defined in Data.MonoTraversable

GrowingAppend Text 
Instance details

Defined in Data.MonoTraversable

GrowingAppend (NonEmpty a) 
Instance details

Defined in Data.MonoTraversable

GrowingAppend (IntMap v) 
Instance details

Defined in Data.MonoTraversable

GrowingAppend (Seq a) 
Instance details

Defined in Data.MonoTraversable

Ord v => GrowingAppend (Set v) 
Instance details

Defined in Data.MonoTraversable

GrowingAppend mono => GrowingAppend (NonNull mono) 
Instance details

Defined in Data.NonNull

(Eq v, Hashable v) => GrowingAppend (HashSet v) 
Instance details

Defined in Data.MonoTraversable

GrowingAppend (Vector a) 
Instance details

Defined in Data.MonoTraversable

Storable a => GrowingAppend (Vector a) 
Instance details

Defined in Data.MonoTraversable

Unbox a => GrowingAppend (Vector a) 
Instance details

Defined in Data.MonoTraversable

GrowingAppend [a] 
Instance details

Defined in Data.MonoTraversable

Ord k => GrowingAppend (Map k v) 
Instance details

Defined in Data.MonoTraversable

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

Defined in Data.MonoTraversable

class MonoFunctor mono => MonoComonad mono where #

Typeclass for monomorphic containers where it is always okay to "extract" a value from with oextract, and where you can extrapolate any "extracting" function to be a function on the whole part with oextend.

oextend and oextract should work together following the laws:

oextend oextract      = id
oextract . oextend f  = f
oextend f . oextend g = oextend (f . oextend g)

As an intuition, oextend f uses f to "build up" a new mono with pieces from the old one received by f.

Methods

oextract :: mono -> Element mono #

Extract an element from mono. Can be thought of as a dual concept to opoint.

oextend :: (mono -> Element mono) -> mono -> mono #

Extend a mono -> Element mono function to be a mono -> mono; that is, builds a new mono from the old one by using pieces glimpsed from the given function.

Instances

Instances details
MonoComonad (ViewL a) 
Instance details

Defined in Data.MonoTraversable

Methods

oextract :: ViewL a -> Element (ViewL a) #

oextend :: (ViewL a -> Element (ViewL a)) -> ViewL a -> ViewL a #

MonoComonad (ViewR a) 
Instance details

Defined in Data.MonoTraversable

Methods

oextract :: ViewR a -> Element (ViewR a) #

oextend :: (ViewR a -> Element (ViewR a)) -> ViewR a -> ViewR a #

IsSequence mono => MonoComonad (NonNull mono) 
Instance details

Defined in Data.NonNull

Methods

oextract :: NonNull mono -> Element (NonNull mono) #

oextend :: (NonNull mono -> Element (NonNull mono)) -> NonNull mono -> NonNull mono #

class MonoPointed mono where #

Typeclass for monomorphic containers that an element can be lifted into.

For any MonoFunctor, the following law holds:

omap f . opoint = opoint . f

Minimal complete definition

Nothing

Methods

opoint :: Element mono -> mono #

Lift an element into a monomorphic container.

opoint is the same as pure for an Applicative

Instances

Instances details
MonoPointed ByteString 
Instance details

Defined in Data.MonoTraversable

MonoPointed ByteString 
Instance details

Defined in Data.MonoTraversable

MonoPointed IntSet 
Instance details

Defined in Data.MonoTraversable

MonoPointed Text 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element Text -> Text #

MonoPointed Text 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element Text -> Text #

MonoPointed (ZipList a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (ZipList a) -> ZipList a #

MonoPointed (Identity a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Identity a) -> Identity a #

MonoPointed (Option a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Option a) -> Option a #

MonoPointed (NonEmpty a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (NonEmpty a) -> NonEmpty a #

MonoPointed (Par1 a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Par1 a) -> Par1 a #

MonoPointed (Seq a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Seq a) -> Seq a #

MonoPointed (ViewL a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (ViewL a) -> ViewL a #

MonoPointed (ViewR a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (ViewR a) -> ViewR a #

MonoPointed (Set a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Set a) -> Set a #

MonoPointed (Tree a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Tree a) -> Tree a #

MonoPointed (IO a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (IO a) -> IO a #

MonoPointed mono => MonoPointed (NonNull mono) 
Instance details

Defined in Data.NonNull

Methods

opoint :: Element (NonNull mono) -> NonNull mono #

Hashable a => MonoPointed (HashSet a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (HashSet a) -> HashSet a #

MonoPointed (Vector a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Vector a) -> Vector a #

Storable a => MonoPointed (Vector a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Vector a) -> Vector a #

Unbox a => MonoPointed (Vector a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Vector a) -> Vector a #

MonoPointed (Maybe a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Maybe a) -> Maybe a #

MonoPointed [a] 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element [a] -> [a] #

Monad m => MonoPointed (WrappedMonad m a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (WrappedMonad m a) -> WrappedMonad m a #

MonoPointed (Either a b) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Either a b) -> Either a b #

MonoPointed (Proxy a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Proxy a) -> Proxy a #

MonoPointed (U1 a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (U1 a) -> U1 a #

(MonoPointed mono, Element mono ~ a) => MonoPointed (WrappedMono mono a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (WrappedMono mono a) -> WrappedMono mono a #

Applicative f => MonoPointed (WrappedPoly f a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (WrappedPoly f a) -> WrappedPoly f a #

Applicative m => MonoPointed (ListT m a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (ListT m a) -> ListT m a #

Applicative f => MonoPointed (MaybeT f a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (MaybeT f a) -> MaybeT f a #

MonoPointed (r -> a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (r -> a) -> r -> a #

Monoid a => MonoPointed (a, b) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (a, b) -> (a, b) #

Arrow a => MonoPointed (WrappedArrow a b c) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (WrappedArrow a b c) -> WrappedArrow a b c #

Monoid m => MonoPointed (Const m a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Const m a) -> Const m a #

Applicative f => MonoPointed (Rec1 f a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Rec1 f a) -> Rec1 f a #

Applicative m => MonoPointed (IdentityT m a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (IdentityT m a) -> IdentityT 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 #

Applicative m => MonoPointed (StateT s m a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (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 #

(Monoid w, Applicative m) => MonoPointed (WriterT w m a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (WriterT w m a) -> WriterT w m a #

(Monoid w, Applicative m) => MonoPointed (WriterT w m a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (WriterT w m a) -> WriterT w m a #

(Applicative f, Applicative g) => MonoPointed (Product f g a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Product f g a) -> Product f g a #

(Applicative f, Applicative g) => MonoPointed ((f :*: g) a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element ((f :*: g) a) -> (f :*: g) a #

(Applicative f, Applicative g) => MonoPointed ((f :+: g) a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element ((f :+: g) a) -> (f :+: g) a #

MonoPointed (ContT r m a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (ContT r m a) -> ContT r m 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 #

(Applicative f, Applicative g) => MonoPointed ((f :.: g) a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element ((f :.: g) a) -> (f :.: g) a #

Applicative f => MonoPointed (M1 i c f a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (M1 i c f a) -> M1 i c f a #

(Monoid w, Applicative m) => MonoPointed (RWST r w s m a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (RWST r w s m a) -> RWST r w s m a #

(Monoid w, Applicative m) => MonoPointed (RWST r w s m a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (RWST r w s m a) -> RWST r w s m a #

class (MonoFunctor mono, MonoFoldable mono) => MonoTraversable mono where #

Monomorphic containers that can be traversed from left to right.

NOTE: Due to limitations with the role system, GHC is yet unable to provide newtype-derivation of MonoTraversable. See https://stackoverflow.com/questions/49776924/newtype-deriving-issequence.

Minimal complete definition

Nothing

Methods

otraverse :: Applicative f => (Element mono -> f (Element mono)) -> mono -> f mono #

Map each element of a monomorphic container to an action, evaluate these actions from left to right, and collect the results.

omapM :: Applicative m => (Element mono -> m (Element mono)) -> mono -> m mono #

Map each element of a monomorphic container to a monadic action, evaluate these actions from left to right, and collect the results.

Instances

Instances details
MonoTraversable ByteString 
Instance details

Defined in Data.MonoTraversable

MonoTraversable ByteString 
Instance details

Defined in Data.MonoTraversable

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 #

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 #

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

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

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

MonoTraversable (Par1 a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (Par1 a) -> f (Element (Par1 a))) -> Par1 a -> f (Par1 a) #

omapM :: Applicative m => (Element (Par1 a) -> m (Element (Par1 a))) -> Par1 a -> m (Par1 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) #

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

MonoTraversable (ViewL a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (ViewL a) -> f (Element (ViewL a))) -> ViewL a -> f (ViewL a) #

omapM :: Applicative m => (Element (ViewL a) -> m (Element (ViewL a))) -> ViewL a -> m (ViewL a) #

MonoTraversable (ViewR a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (ViewR a) -> f (Element (ViewR a))) -> ViewR a -> f (ViewR a) #

omapM :: Applicative m => (Element (ViewR a) -> m (Element (ViewR a))) -> ViewR a -> m (ViewR a) #

MonoTraversable (Tree a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (Tree a) -> f (Element (Tree a))) -> Tree a -> f (Tree a) #

omapM :: Applicative m => (Element (Tree a) -> m (Element (Tree a))) -> Tree a -> m (Tree a) #

MonoTraversable mono => MonoTraversable (NonNull mono) 
Instance details

Defined in Data.NonNull

Methods

otraverse :: Applicative f => (Element (NonNull mono) -> f (Element (NonNull mono))) -> NonNull mono -> f (NonNull mono) #

omapM :: Applicative m => (Element (NonNull mono) -> m (Element (NonNull mono))) -> NonNull mono -> m (NonNull mono) #

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

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

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

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

MonoTraversable [a] 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element [a] -> f (Element [a])) -> [a] -> f [a] #

omapM :: Applicative m => (Element [a] -> m (Element [a])) -> [a] -> m [a] #

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

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

MonoTraversable (U1 a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (U1 a) -> f (Element (U1 a))) -> U1 a -> f (U1 a) #

omapM :: Applicative m => (Element (U1 a) -> m (Element (U1 a))) -> U1 a -> m (U1 a) #

MonoTraversable (V1 a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (V1 a) -> f (Element (V1 a))) -> V1 a -> f (V1 a) #

omapM :: Applicative m => (Element (V1 a) -> m (Element (V1 a))) -> V1 a -> m (V1 a) #

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

Traversable f => MonoTraversable (ListT f a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f0 => (Element (ListT f a) -> f0 (Element (ListT f a))) -> ListT f a -> f0 (ListT f a) #

omapM :: Applicative m => (Element (ListT f a) -> m (Element (ListT f a))) -> ListT f a -> m (ListT 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) #

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

MonoTraversable (a, b) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (a, b) -> f (Element (a, b))) -> (a, b) -> f (a, b) #

omapM :: Applicative m => (Element (a, b) -> m (Element (a, b))) -> (a, b) -> m (a, b) #

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

Traversable f => MonoTraversable (Rec1 f a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f0 => (Element (Rec1 f a) -> f0 (Element (Rec1 f a))) -> Rec1 f a -> f0 (Rec1 f a) #

omapM :: Applicative m => (Element (Rec1 f a) -> m (Element (Rec1 f a))) -> Rec1 f a -> m (Rec1 f 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) #

Traversable f => MonoTraversable (WriterT w f a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f0 => (Element (WriterT w f a) -> f0 (Element (WriterT w f a))) -> WriterT w f a -> f0 (WriterT w f a) #

omapM :: Applicative m => (Element (WriterT w f a) -> m (Element (WriterT w f a))) -> WriterT w f a -> m (WriterT w f a) #

Traversable f => MonoTraversable (WriterT w f a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f0 => (Element (WriterT w f a) -> f0 (Element (WriterT w f a))) -> WriterT w f a -> f0 (WriterT w f a) #

omapM :: Applicative m => (Element (WriterT w f a) -> m (Element (WriterT w f a))) -> WriterT w f a -> m (WriterT w f a) #

(Traversable f, Traversable g) => MonoTraversable (Product f g a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f0 => (Element (Product f g a) -> f0 (Element (Product f g a))) -> Product f g a -> f0 (Product f g a) #

omapM :: Applicative m => (Element (Product f g a) -> m (Element (Product f g a))) -> Product f g a -> m (Product f g a) #

(Traversable f, Traversable g) => MonoTraversable ((f :*: g) a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f0 => (Element ((f :*: g) a) -> f0 (Element ((f :*: g) a))) -> (f :*: g) a -> f0 ((f :*: g) a) #

omapM :: Applicative m => (Element ((f :*: g) a) -> m (Element ((f :*: g) a))) -> (f :*: g) a -> m ((f :*: g) a) #

(Traversable f, Traversable g) => MonoTraversable ((f :+: g) a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f0 => (Element ((f :+: g) a) -> f0 (Element ((f :+: g) a))) -> (f :+: g) a -> f0 ((f :+: g) a) #

omapM :: Applicative m => (Element ((f :+: g) a) -> m (Element ((f :+: g) a))) -> (f :+: g) a -> m ((f :+: g) a) #

MonoTraversable (K1 i c a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (K1 i c a) -> f (Element (K1 i c a))) -> K1 i c a -> f (K1 i c a) #

omapM :: Applicative m => (Element (K1 i c a) -> m (Element (K1 i c a))) -> K1 i c a -> m (K1 i c 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) #

(Traversable f, Traversable g) => MonoTraversable ((f :.: g) a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f0 => (Element ((f :.: g) a) -> f0 (Element ((f :.: g) a))) -> (f :.: g) a -> f0 ((f :.: g) a) #

omapM :: Applicative m => (Element ((f :.: g) a) -> m (Element ((f :.: g) a))) -> (f :.: g) a -> m ((f :.: g) a) #

Traversable f => MonoTraversable (M1 i c f a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f0 => (Element (M1 i c f a) -> f0 (Element (M1 i c f a))) -> M1 i c f a -> f0 (M1 i c f a) #

omapM :: Applicative m => (Element (M1 i c f a) -> m (Element (M1 i c f a))) -> M1 i c f a -> m (M1 i c f a) #

class MonoFoldable mono where #

Monomorphic containers that can be folded.

Minimal complete definition

Nothing

Methods

ofoldMap :: Monoid m => (Element mono -> m) -> mono -> m #

Map each element of a monomorphic container to a Monoid and combine the results.

ofoldr :: (Element mono -> b -> b) -> b -> mono -> b #

Right-associative fold of a monomorphic container.

ofoldl' :: (a -> Element mono -> a) -> a -> mono -> a #

Strict left-associative fold of a monomorphic container.

otoList :: mono -> [Element mono] #

Convert a monomorphic container to a list.

oall :: (Element mono -> Bool) -> mono -> Bool #

Are all of the elements in a monomorphic container converted to booleans True?

oany :: (Element mono -> Bool) -> mono -> Bool #

Are any of the elements in a monomorphic container converted to booleans True?

onull :: mono -> Bool #

Is the monomorphic container empty?

olength :: mono -> Int #

Length of a monomorphic container, returns a Int.

olength64 :: mono -> Int64 #

Length of a monomorphic container, returns a Int64.

ocompareLength :: Integral i => mono -> i -> Ordering #

Compare the length of a monomorphic container and a given number.

otraverse_ :: Applicative f => (Element mono -> f b) -> mono -> f () #

Map each element of a monomorphic container to an action, evaluate these actions from left to right, and ignore the results.

ofor_ :: Applicative f => mono -> (Element mono -> f b) -> f () #

ofor_ is otraverse_ with its arguments flipped.

omapM_ :: Applicative m => (Element mono -> m ()) -> mono -> m () #

Map each element of a monomorphic container to a monadic action, evaluate these actions from left to right, and ignore the results.

oforM_ :: Applicative m => mono -> (Element mono -> m ()) -> m () #

oforM_ is omapM_ with its arguments flipped.

ofoldlM :: Monad m => (a -> Element mono -> m a) -> a -> mono -> m a #

Monadic fold over the elements of a monomorphic container, associating to the left.

ofoldMap1Ex :: Semigroup m => (Element mono -> m) -> mono -> m #

Map each element of a monomorphic container to a semigroup, and combine the results.

Note: this is a partial function. On an empty MonoFoldable, it will throw an exception.

See ofoldMap1 from Data.NonNull for a total version of this function.

ofoldr1Ex :: (Element mono -> Element mono -> Element mono) -> mono -> Element mono #

Right-associative fold of a monomorphic container with no base element.

Note: this is a partial function. On an empty MonoFoldable, it will throw an exception.

See ofoldr1 from Data.NonNull for a total version of this function.

ofoldl1Ex' :: (Element mono -> Element mono -> Element mono) -> mono -> Element mono #

Strict left-associative fold of a monomorphic container with no base element.

Note: this is a partial function. On an empty MonoFoldable, it will throw an exception.

See ofoldl1' from Data.NonNull for a total version of this function.

headEx :: mono -> Element mono #

Get the first element of a monomorphic container.

Note: this is a partial function. On an empty MonoFoldable, it will throw an exception.

See head from Data.NonNull for a total version of this function.

lastEx :: mono -> Element mono #

Get the last element of a monomorphic container.

Note: this is a partial function. On an empty MonoFoldable, it will throw an exception.

See last from Data.NonNull for a total version of this function.

unsafeHead :: mono -> Element mono #

Equivalent to headEx.

unsafeLast :: mono -> Element mono #

Equivalent to lastEx.

maximumByEx :: (Element mono -> Element mono -> Ordering) -> mono -> Element mono #

Get the maximum element of a monomorphic container, using a supplied element ordering function.

Note: this is a partial function. On an empty MonoFoldable, it will throw an exception.

See maximiumBy from Data.NonNull for a total version of this function.

minimumByEx :: (Element mono -> Element mono -> Ordering) -> mono -> Element mono #

Get the minimum element of a monomorphic container, using a supplied element ordering function.

Note: this is a partial function. On an empty MonoFoldable, it will throw an exception.

See minimumBy from Data.NonNull for a total version of this function.

oelem :: Element mono -> mono -> Bool #

Checks if the monomorphic container includes the supplied element.

onotElem :: Element mono -> mono -> Bool #

Checks if the monomorphic container does not include the supplied element.

Instances

Instances details
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 #

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 #

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 #

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 #

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 #

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 #

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 #

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 #

MonoFoldable (Par1 a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (Par1 a) -> m) -> Par1 a -> m #

ofoldr :: (Element (Par1 a) -> b -> b) -> b -> Par1 a -> b #

ofoldl' :: (a0 -> Element (Par1 a) -> a0) -> a0 -> Par1 a -> a0 #

otoList :: Par1 a -> [Element (Par1 a)] #

oall :: (Element (Par1 a) -> Bool) -> Par1 a -> Bool #

oany :: (Element (Par1 a) -> Bool) -> Par1 a -> Bool #

onull :: Par1 a -> Bool #

olength :: Par1 a -> Int #

olength64 :: Par1 a -> Int64 #

ocompareLength :: Integral i => Par1 a -> i -> Ordering #

otraverse_ :: Applicative f => (Element (Par1 a) -> f b) -> Par1 a -> f () #

ofor_ :: Applicative f => Par1 a -> (Element (Par1 a) -> f b) -> f () #

omapM_ :: Applicative m => (Element (Par1 a) -> m ()) -> Par1 a -> m () #

oforM_ :: Applicative m => Par1 a -> (Element (Par1 a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (Par1 a) -> m a0) -> a0 -> Par1 a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (Par1 a) -> m) -> Par1 a -> m #

ofoldr1Ex :: (Element (Par1 a) -> Element (Par1 a) -> Element (Par1 a)) -> Par1 a -> Element (Par1 a) #

ofoldl1Ex' :: (Element (Par1 a) -> Element (Par1 a) -> Element (Par1 a)) -> Par1 a -> Element (Par1 a) #

headEx :: Par1 a -> Element (Par1 a) #

lastEx :: Par1 a -> Element (Par1 a) #

unsafeHead :: Par1 a -> Element (Par1 a) #

unsafeLast :: Par1 a -> Element (Par1 a) #

maximumByEx :: (Element (Par1 a) -> Element (Par1 a) -> Ordering) -> Par1 a -> Element (Par1 a) #

minimumByEx :: (Element (Par1 a) -> Element (Par1 a) -> Ordering) -> Par1 a -> Element (Par1 a) #

oelem :: Element (Par1 a) -> Par1 a -> Bool #

onotElem :: Element (Par1 a) -> Par1 a -> Bool #

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 #

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 #

MonoFoldable (ViewL a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (ViewL a) -> m) -> ViewL a -> m #

ofoldr :: (Element (ViewL a) -> b -> b) -> b -> ViewL a -> b #

ofoldl' :: (a0 -> Element (ViewL a) -> a0) -> a0 -> ViewL a -> a0 #

otoList :: ViewL a -> [Element (ViewL a)] #

oall :: (Element (ViewL a) -> Bool) -> ViewL a -> Bool #

oany :: (Element (ViewL a) -> Bool) -> ViewL a -> Bool #

onull :: ViewL a -> Bool #

olength :: ViewL a -> Int #

olength64 :: ViewL a -> Int64 #

ocompareLength :: Integral i => ViewL a -> i -> Ordering #

otraverse_ :: Applicative f => (Element (ViewL a) -> f b) -> ViewL a -> f () #

ofor_ :: Applicative f => ViewL a -> (Element (ViewL a) -> f b) -> f () #

omapM_ :: Applicative m => (Element (ViewL a) -> m ()) -> ViewL a -> m () #

oforM_ :: Applicative m => ViewL a -> (Element (ViewL a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (ViewL a) -> m a0) -> a0 -> ViewL a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (ViewL a) -> m) -> ViewL a -> m #

ofoldr1Ex :: (Element (ViewL a) -> Element (ViewL a) -> Element (ViewL a)) -> ViewL a -> Element (ViewL a) #

ofoldl1Ex' :: (Element (ViewL a) -> Element (ViewL a) -> Element (ViewL a)) -> ViewL a -> Element (ViewL a) #

headEx :: ViewL a -> Element (ViewL a) #

lastEx :: ViewL a -> Element (ViewL a) #

unsafeHead :: ViewL a -> Element (ViewL a) #

unsafeLast :: ViewL a -> Element (ViewL a) #

maximumByEx :: (Element (ViewL a) -> Element (ViewL a) -> Ordering) -> ViewL a -> Element (ViewL a) #

minimumByEx :: (Element (ViewL a) -> Element (ViewL a) -> Ordering) -> ViewL a -> Element (ViewL a) #

oelem :: Element (ViewL a) -> ViewL a -> Bool #

onotElem :: Element (ViewL a) -> ViewL a -> Bool #

MonoFoldable (ViewR a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (ViewR a) -> m) -> ViewR a -> m #

ofoldr :: (Element (ViewR a) -> b -> b) -> b -> ViewR a -> b #

ofoldl' :: (a0 -> Element (ViewR a) -> a0) -> a0 -> ViewR a -> a0 #

otoList :: ViewR a -> [Element (ViewR a)] #

oall :: (Element (ViewR a) -> Bool) -> ViewR a -> Bool #

oany :: (Element (ViewR a) -> Bool) -> ViewR a -> Bool #

onull :: ViewR a -> Bool #

olength :: ViewR a -> Int #

olength64 :: ViewR a -> Int64 #

ocompareLength :: Integral i => ViewR a -> i -> Ordering #

otraverse_ :: Applicative f => (Element (ViewR a) -> f b) -> ViewR a -> f () #

ofor_ :: Applicative f => ViewR a -> (Element (ViewR a) -> f b) -> f () #

omapM_ :: Applicative m => (Element (ViewR a) -> m ()) -> ViewR a -> m () #

oforM_ :: Applicative m => ViewR a -> (Element (ViewR a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (ViewR a) -> m a0) -> a0 -> ViewR a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (ViewR a) -> m) -> ViewR a -> m #

ofoldr1Ex :: (Element (ViewR a) -> Element (ViewR a) -> Element (ViewR a)) -> ViewR a -> Element (ViewR a) #

ofoldl1Ex' :: (Element (ViewR a) -> Element (ViewR a) -> Element (ViewR a)) -> ViewR a -> Element (ViewR a) #

headEx :: ViewR a -> Element (ViewR a) #

lastEx :: ViewR a -> Element (ViewR a) #

unsafeHead :: ViewR a -> Element (ViewR a) #

unsafeLast :: ViewR a -> Element (ViewR a) #

maximumByEx :: (Element (ViewR a) -> Element (ViewR a) -> Ordering) -> ViewR a -> Element (ViewR a) #

minimumByEx :: (Element (ViewR a) -> Element (ViewR a) -> Ordering) -> ViewR a -> Element (ViewR a) #

oelem :: Element (ViewR a) -> ViewR a -> Bool #

onotElem :: Element (ViewR a) -> ViewR a -> Bool #

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 #

MonoFoldable (Tree a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (Tree a) -> m) -> Tree a -> m #

ofoldr :: (Element (Tree a) -> b -> b) -> b -> Tree a -> b #

ofoldl' :: (a0 -> Element (Tree a) -> a0) -> a0 -> Tree a -> a0 #

otoList :: Tree a -> [Element (Tree a)] #

oall :: (Element (Tree a) -> Bool) -> Tree a -> Bool #

oany :: (Element (Tree a) -> Bool) -> Tree a -> Bool #

onull :: Tree a -> Bool #

olength :: Tree a -> Int #

olength64 :: Tree a -> Int64 #

ocompareLength :: Integral i => Tree a -> i -> Ordering #

otraverse_ :: Applicative f => (Element (Tree a) -> f b) -> Tree a -> f () #

ofor_ :: Applicative f => Tree a -> (Element (Tree a) -> f b) -> f () #

omapM_ :: Applicative m => (Element (Tree a) -> m ()) -> Tree a -> m () #

oforM_ :: Applicative m => Tree a -> (Element (Tree a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (Tree a) -> m a0) -> a0 -> Tree a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (Tree a) -> m) -> Tree a -> m #

ofoldr1Ex :: (Element (Tree a) -> Element (Tree a) -> Element (Tree a)) -> Tree a -> Element (Tree a) #

ofoldl1Ex' :: (Element (Tree a) -> Element (Tree a) -> Element (Tree a)) -> Tree a -> Element (Tree a) #

headEx :: Tree a -> Element (Tree a) #

lastEx :: Tree a -> Element (Tree a) #

unsafeHead :: Tree a -> Element (Tree a) #

unsafeLast :: Tree a -> Element (Tree a) #

maximumByEx :: (Element (Tree a) -> Element (Tree a) -> Ordering) -> Tree a -> Element (Tree a) #

minimumByEx :: (Element (Tree a) -> Element (Tree a) -> Ordering) -> Tree a -> Element (Tree a) #

oelem :: Element (Tree a) -> Tree a -> Bool #

onotElem :: Element (Tree a) -> Tree a -> Bool #

MonoFoldable mono => MonoFoldable (NonNull mono) 
Instance details

Defined in Data.NonNull

Methods

ofoldMap :: Monoid m => (Element (NonNull mono) -> m) -> NonNull mono -> m #

ofoldr :: (Element (NonNull mono) -> b -> b) -> b -> NonNull mono -> b #

ofoldl' :: (a -> Element (NonNull mono) -> a) -> a -> NonNull mono -> a #

otoList :: NonNull mono -> [Element (NonNull mono)] #

oall :: (Element (NonNull mono) -> Bool) -> NonNull mono -> Bool #

oany :: (Element (NonNull mono) -> Bool) -> NonNull mono -> Bool #

onull :: NonNull mono -> Bool #

olength :: NonNull mono -> Int #

olength64 :: NonNull mono -> Int64 #

ocompareLength :: Integral i => NonNull mono -> i -> Ordering #

otraverse_ :: Applicative f => (Element (NonNull mono) -> f b) -> NonNull mono -> f () #

ofor_ :: Applicative f => NonNull mono -> (Element (NonNull mono) -> f b) -> f () #

omapM_ :: Applicative m => (Element (NonNull mono) -> m ()) -> NonNull mono -> m () #

oforM_ :: Applicative m => NonNull mono -> (Element (NonNull mono) -> m ()) -> m () #

ofoldlM :: Monad m => (a -> Element (NonNull mono) -> m a) -> a -> NonNull mono -> m a #

ofoldMap1Ex :: Semigroup m => (Element (NonNull mono) -> m) -> NonNull mono -> m #

ofoldr1Ex :: (Element (NonNull mono) -> Element (NonNull mono) -> Element (NonNull mono)) -> NonNull mono -> Element (NonNull mono) #

ofoldl1Ex' :: (Element (NonNull mono) -> Element (NonNull mono) -> Element (NonNull mono)) -> NonNull mono -> Element (NonNull mono) #

headEx :: NonNull mono -> Element (NonNull mono) #

lastEx :: NonNull mono -> Element (NonNull mono) #

unsafeHead :: NonNull mono -> Element (NonNull mono) #

unsafeLast :: NonNull mono -> Element (NonNull mono) #

maximumByEx :: (Element (NonNull mono) -> Element (NonNull mono) -> Ordering) -> NonNull mono -> Element (NonNull mono) #

minimumByEx :: (Element (NonNull mono) -> Element (NonNull mono) -> Ordering) -> NonNull mono -> Element (NonNull mono) #

oelem :: Element (NonNull mono) -> NonNull mono -> Bool #

onotElem :: Element (NonNull mono) -> NonNull mono -> Bool #

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 #

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 #

Storable a => 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 #

Unbox a => 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 #

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 #

MonoFoldable [a] 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element [a] -> m) -> [a] -> m #

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

ofoldl' :: (a0 -> Element [a] -> a0) -> a0 -> [a] -> a0 #

otoList :: [a] -> [Element [a]] #

oall :: (Element [a] -> Bool) -> [a] -> Bool #

oany :: (Element [a] -> Bool) -> [a] -> Bool #

onull :: [a] -> Bool #

olength :: [a] -> Int #

olength64 :: [a] -> Int64 #

ocompareLength :: Integral i => [a] -> i -> Ordering #

otraverse_ :: Applicative f => (Element [a] -> f b) -> [a] -> f () #

ofor_ :: Applicative f => [a] -> (Element [a] -> f b) -> f () #

omapM_ :: Applicative m => (Element [a] -> m ()) -> [a] -> m () #

oforM_ :: Applicative m => [a] -> (Element [a] -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element [a] -> m a0) -> a0 -> [a] -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element [a] -> m) -> [a] -> m #

ofoldr1Ex :: (Element [a] -> Element [a] -> Element [a]) -> [a] -> Element [a] #

ofoldl1Ex' :: (Element [a] -> Element [a] -> Element [a]) -> [a] -> Element [a] #

headEx :: [a] -> Element [a] #

lastEx :: [a] -> Element [a] #

unsafeHead :: [a] -> Element [a] #

unsafeLast :: [a] -> Element [a] #

maximumByEx :: (Element [a] -> Element [a] -> Ordering) -> [a] -> Element [a] #

minimumByEx :: (Element [a] -> Element [a] -> Ordering) -> [a] -> Element [a] #

oelem :: Element [a] -> [a] -> Bool #

onotElem :: Element [a] -> [a] -> Bool #

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 #

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 #

MonoFoldable (U1 a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (U1 a) -> m) -> U1 a -> m #

ofoldr :: (Element (U1 a) -> b -> b) -> b -> U1 a -> b #

ofoldl' :: (a0 -> Element (U1 a) -> a0) -> a0 -> U1 a -> a0 #

otoList :: U1 a -> [Element (U1 a)] #

oall :: (Element (U1 a) -> Bool) -> U1 a -> Bool #

oany :: (Element (U1 a) -> Bool) -> U1 a -> Bool #

onull :: U1 a -> Bool #

olength :: U1 a -> Int #

olength64 :: U1 a -> Int64 #

ocompareLength :: Integral i => U1 a -> i -> Ordering #

otraverse_ :: Applicative f => (Element (U1 a) -> f b) -> U1 a -> f () #

ofor_ :: Applicative f => U1 a -> (Element (U1 a) -> f b) -> f () #

omapM_ :: Applicative m => (Element (U1 a) -> m ()) -> U1 a -> m () #

oforM_ :: Applicative m => U1 a -> (Element (U1 a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (U1 a) -> m a0) -> a0 -> U1 a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (U1 a) -> m) -> U1 a -> m #

ofoldr1Ex :: (Element (U1 a) -> Element (U1 a) -> Element (U1 a)) -> U1 a -> Element (U1 a) #

ofoldl1Ex' :: (Element (U1 a) -> Element (U1 a) -> Element (U1 a)) -> U1 a -> Element (U1 a) #

headEx :: U1 a -> Element (U1 a) #

lastEx :: U1 a -> Element (U1 a) #

unsafeHead :: U1 a -> Element (U1 a) #

unsafeLast :: U1 a -> Element (U1 a) #

maximumByEx :: (Element (U1 a) -> Element (U1 a) -> Ordering) -> U1 a -> Element (U1 a) #

minimumByEx :: (Element (U1 a) -> Element (U1 a) -> Ordering) -> U1 a -> Element (U1 a) #

oelem :: Element (U1 a) -> U1 a -> Bool #

onotElem :: Element (U1 a) -> U1 a -> Bool #

MonoFoldable (V1 a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (V1 a) -> m) -> V1 a -> m #

ofoldr :: (Element (V1 a) -> b -> b) -> b -> V1 a -> b #

ofoldl' :: (a0 -> Element (V1 a) -> a0) -> a0 -> V1 a -> a0 #

otoList :: V1 a -> [Element (V1 a)] #

oall :: (Element (V1 a) -> Bool) -> V1 a -> Bool #

oany :: (Element (V1 a) -> Bool) -> V1 a -> Bool #

onull :: V1 a -> Bool #

olength :: V1 a -> Int #

olength64 :: V1 a -> Int64 #

ocompareLength :: Integral i => V1 a -> i -> Ordering #

otraverse_ :: Applicative f => (Element (V1 a) -> f b) -> V1 a -> f () #

ofor_ :: Applicative f => V1 a -> (Element (V1 a) -> f b) -> f () #

omapM_ :: Applicative m => (Element (V1 a) -> m ()) -> V1 a -> m () #

oforM_ :: Applicative m => V1 a -> (Element (V1 a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (V1 a) -> m a0) -> a0 -> V1 a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (V1 a) -> m) -> V1 a -> m #

ofoldr1Ex :: (Element (V1 a) -> Element (V1 a) -> Element (V1 a)) -> V1 a -> Element (V1 a) #

ofoldl1Ex' :: (Element (V1 a) -> Element (V1 a) -> Element (V1 a)) -> V1 a -> Element (V1 a) #

headEx :: V1 a -> Element (V1 a) #

lastEx :: V1 a -> Element (V1 a) #

unsafeHead :: V1 a -> Element (V1 a) #

unsafeLast :: V1 a -> Element (V1 a) #

maximumByEx :: (Element (V1 a) -> Element (V1 a) -> Ordering) -> V1 a -> Element (V1 a) #

minimumByEx :: (Element (V1 a) -> Element (V1 a) -> Ordering) -> V1 a -> Element (V1 a) #

oelem :: Element (V1 a) -> V1 a -> Bool #

onotElem :: Element (V1 a) -> V1 a -> Bool #

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 #

MonoFoldable mono => MonoFoldable (WrappedMono mono a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (WrappedMono mono a) -> m) -> WrappedMono mono a -> m #

ofoldr :: (Element (WrappedMono mono a) -> b -> b) -> b -> WrappedMono mono a -> b #

ofoldl' :: (a0 -> Element (WrappedMono mono a) -> a0) -> a0 -> WrappedMono mono a -> a0 #

otoList :: WrappedMono mono a -> [Element (WrappedMono mono a)] #

oall :: (Element (WrappedMono mono a) -> Bool) -> WrappedMono mono a -> Bool #

oany :: (Element (WrappedMono mono a) -> Bool) -> WrappedMono mono a -> Bool #

onull :: WrappedMono mono a -> Bool #

olength :: WrappedMono mono a -> Int #

olength64 :: WrappedMono mono a -> Int64 #

ocompareLength :: Integral i => WrappedMono mono a -> i -> Ordering #

otraverse_ :: Applicative f => (Element (WrappedMono mono a) -> f b) -> WrappedMono mono a -> f () #

ofor_ :: Applicative f => WrappedMono mono a -> (Element (WrappedMono mono a) -> f b) -> f () #

omapM_ :: Applicative m => (Element (WrappedMono mono a) -> m ()) -> WrappedMono mono a -> m () #

oforM_ :: Applicative m => WrappedMono mono a -> (Element (WrappedMono mono a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (WrappedMono mono a) -> m a0) -> a0 -> WrappedMono mono a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (WrappedMono mono a) -> m) -> WrappedMono mono a -> m #

ofoldr1Ex :: (Element (WrappedMono mono a) -> Element (WrappedMono mono a) -> Element (WrappedMono mono a)) -> WrappedMono mono a -> Element (WrappedMono mono a) #

ofoldl1Ex' :: (Element (WrappedMono mono a) -> Element (WrappedMono mono a) -> Element (WrappedMono mono a)) -> WrappedMono mono a -> Element (WrappedMono mono a) #

headEx :: WrappedMono mono a -> Element (WrappedMono mono a) #

lastEx :: WrappedMono mono a -> Element (WrappedMono mono a) #

unsafeHead :: WrappedMono mono a -> Element (WrappedMono mono a) #

unsafeLast :: WrappedMono mono a -> Element (WrappedMono mono a) #

maximumByEx :: (Element (WrappedMono mono a) -> Element (WrappedMono mono a) -> Ordering) -> WrappedMono mono a -> Element (WrappedMono mono a) #

minimumByEx :: (Element (WrappedMono mono a) -> Element (WrappedMono mono a) -> Ordering) -> WrappedMono mono a -> Element (WrappedMono mono a) #

oelem :: Element (WrappedMono mono a) -> WrappedMono mono a -> Bool #

onotElem :: Element (WrappedMono mono a) -> WrappedMono mono a -> Bool #

Foldable f => MonoFoldable (WrappedPoly f a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (WrappedPoly f a) -> m) -> WrappedPoly f a -> m #

ofoldr :: (Element (WrappedPoly f a) -> b -> b) -> b -> WrappedPoly f a -> b #

ofoldl' :: (a0 -> Element (WrappedPoly f a) -> a0) -> a0 -> WrappedPoly f a -> a0 #

otoList :: WrappedPoly f a -> [Element (WrappedPoly f a)] #

oall :: (Element (WrappedPoly f a) -> Bool) -> WrappedPoly f a -> Bool #

oany :: (Element (WrappedPoly f a) -> Bool) -> WrappedPoly f a -> Bool #

onull :: WrappedPoly f a -> Bool #

olength :: WrappedPoly f a -> Int #

olength64 :: WrappedPoly f a -> Int64 #

ocompareLength :: Integral i => WrappedPoly f a -> i -> Ordering #

otraverse_ :: Applicative f0 => (Element (WrappedPoly f a) -> f0 b) -> WrappedPoly f a -> f0 () #

ofor_ :: Applicative f0 => WrappedPoly f a -> (Element (WrappedPoly f a) -> f0 b) -> f0 () #

omapM_ :: Applicative m => (Element (WrappedPoly f a) -> m ()) -> WrappedPoly f a -> m () #

oforM_ :: Applicative m => WrappedPoly f a -> (Element (WrappedPoly f a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (WrappedPoly f a) -> m a0) -> a0 -> WrappedPoly f a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (WrappedPoly f a) -> m) -> WrappedPoly f a -> m #

ofoldr1Ex :: (Element (WrappedPoly f a) -> Element (WrappedPoly f a) -> Element (WrappedPoly f a)) -> WrappedPoly f a -> Element (WrappedPoly f a) #

ofoldl1Ex' :: (Element (WrappedPoly f a) -> Element (WrappedPoly f a) -> Element (WrappedPoly f a)) -> WrappedPoly f a -> Element (WrappedPoly f a) #

headEx :: WrappedPoly f a -> Element (WrappedPoly f a) #

lastEx :: WrappedPoly f a -> Element (WrappedPoly f a) #

unsafeHead :: WrappedPoly f a -> Element (WrappedPoly f a) #

unsafeLast :: WrappedPoly f a -> Element (WrappedPoly f a) #

maximumByEx :: (Element (WrappedPoly f a) -> Element (WrappedPoly f a) -> Ordering) -> WrappedPoly f a -> Element (WrappedPoly f a) #

minimumByEx :: (Element (WrappedPoly f a) -> Element (WrappedPoly f a) -> Ordering) -> WrappedPoly f a -> Element (WrappedPoly f a) #

oelem :: Element (WrappedPoly f a) -> WrappedPoly f a -> Bool #

onotElem :: Element (WrappedPoly f a) -> WrappedPoly f a -> Bool #

Foldable f => MonoFoldable (ListT f a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (ListT f a) -> m) -> ListT f a -> m #

ofoldr :: (Element (ListT f a) -> b -> b) -> b -> ListT f a -> b #

ofoldl' :: (a0 -> Element (ListT f a) -> a0) -> a0 -> ListT f a -> a0 #

otoList :: ListT f a -> [Element (ListT f a)] #

oall :: (Element (ListT f a) -> Bool) -> ListT f a -> Bool #

oany :: (Element (ListT f a) -> Bool) -> ListT f a -> Bool #

onull :: ListT f a -> Bool #

olength :: ListT f a -> Int #

olength64 :: ListT f a -> Int64 #

ocompareLength :: Integral i => ListT f a -> i -> Ordering #

otraverse_ :: Applicative f0 => (Element (ListT f a) -> f0 b) -> ListT f a -> f0 () #

ofor_ :: Applicative f0 => ListT f a -> (Element (ListT f a) -> f0 b) -> f0 () #

omapM_ :: Applicative m => (Element (ListT f a) -> m ()) -> ListT f a -> m () #

oforM_ :: Applicative m => ListT f a -> (Element (ListT f a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (ListT f a) -> m a0) -> a0 -> ListT f a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (ListT f a) -> m) -> ListT f a -> m #

ofoldr1Ex :: (Element (ListT f a) -> Element (ListT f a) -> Element (ListT f a)) -> ListT f a -> Element (ListT f a) #

ofoldl1Ex' :: (Element (ListT f a) -> Element (ListT f a) -> Element (ListT f a)) -> ListT f a -> Element (ListT f a) #

headEx :: ListT f a -> Element (ListT f a) #

lastEx :: ListT f a -> Element (ListT f a) #

unsafeHead :: ListT f a -> Element (ListT f a) #

unsafeLast :: ListT f a -> Element (ListT f a) #

maximumByEx :: (Element (ListT f a) -> Element (ListT f a) -> Ordering) -> ListT f a -> Element (ListT f a) #

minimumByEx :: (Element (ListT f a) -> Element (ListT f a) -> Ordering) -> ListT f a -> Element (ListT f a) #

oelem :: Element (ListT f a) -> ListT f a -> Bool #

onotElem :: Element (ListT f a) -> ListT f a -> Bool #

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 #

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 #

MonoFoldable (a, b) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (a, b) -> m) -> (a, b) -> m #

ofoldr :: (Element (a, b) -> b0 -> b0) -> b0 -> (a, b) -> b0 #

ofoldl' :: (a0 -> Element (a, b) -> a0) -> a0 -> (a, b) -> a0 #

otoList :: (a, b) -> [Element (a, b)] #

oall :: (Element (a, b) -> Bool) -> (a, b) -> Bool #

oany :: (Element (a, b) -> Bool) -> (a, b) -> Bool #

onull :: (a, b) -> Bool #

olength :: (a, b) -> Int #

olength64 :: (a, b) -> Int64 #

ocompareLength :: Integral i => (a, b) -> i -> Ordering #

otraverse_ :: Applicative f => (Element (a, b) -> f b0) -> (a, b) -> f () #

ofor_ :: Applicative f => (a, b) -> (Element (a, b) -> f b0) -> f () #

omapM_ :: Applicative m => (Element (a, b) -> m ()) -> (a, b) -> m () #

oforM_ :: Applicative m => (a, b) -> (Element (a, b) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (a, b) -> m a0) -> a0 -> (a, b) -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (a, b) -> m) -> (a, b) -> m #

ofoldr1Ex :: (Element (a, b) -> Element (a, b) -> Element (a, b)) -> (a, b) -> Element (a, b) #

ofoldl1Ex' :: (Element (a, b) -> Element (a, b) -> Element (a, b)) -> (a, b) -> Element (a, b) #

headEx :: (a, b) -> Element (a, b) #

lastEx :: (a, b) -> Element (a, b) #

unsafeHead :: (a, b) -> Element (a, b) #

unsafeLast :: (a, b) -> Element (a, b) #

maximumByEx :: (Element (a, b) -> Element (a, b) -> Ordering) -> (a, b) -> Element (a, b) #

minimumByEx :: (Element (a, b) -> Element (a, b) -> Ordering) -> (a, b) -> Element (a, b) #

oelem :: Element (a, b) -> (a, b) -> Bool #

onotElem :: Element (a, b) -> (a, b) -> Bool #

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 #

Foldable f => MonoFoldable (Rec1 f a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (Rec1 f a) -> m) -> Rec1 f a -> m #

ofoldr :: (Element (Rec1 f a) -> b -> b) -> b -> Rec1 f a -> b #

ofoldl' :: (a0 -> Element (Rec1 f a) -> a0) -> a0 -> Rec1 f a -> a0 #

otoList :: Rec1 f a -> [Element (Rec1 f a)] #

oall :: (Element (Rec1 f a) -> Bool) -> Rec1 f a -> Bool #

oany :: (Element (Rec1 f a) -> Bool) -> Rec1 f a -> Bool #

onull :: Rec1 f a -> Bool #

olength :: Rec1 f a -> Int #

olength64 :: Rec1 f a -> Int64 #

ocompareLength :: Integral i => Rec1 f a -> i -> Ordering #

otraverse_ :: Applicative f0 => (Element (Rec1 f a) -> f0 b) -> Rec1 f a -> f0 () #

ofor_ :: Applicative f0 => Rec1 f a -> (Element (Rec1 f a) -> f0 b) -> f0 () #

omapM_ :: Applicative m => (Element (Rec1 f a) -> m ()) -> Rec1 f a -> m () #

oforM_ :: Applicative m => Rec1 f a -> (Element (Rec1 f a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (Rec1 f a) -> m a0) -> a0 -> Rec1 f a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (Rec1 f a) -> m) -> Rec1 f a -> m #

ofoldr1Ex :: (Element (Rec1 f a) -> Element (Rec1 f a) -> Element (Rec1 f a)) -> Rec1 f a -> Element (Rec1 f a) #

ofoldl1Ex' :: (Element (Rec1 f a) -> Element (Rec1 f a) -> Element (Rec1 f a)) -> Rec1 f a -> Element (Rec1 f a) #

headEx :: Rec1 f a -> Element (Rec1 f a) #

lastEx :: Rec1 f a -> Element (Rec1 f a) #

unsafeHead :: Rec1 f a -> Element (Rec1 f a) #

unsafeLast :: Rec1 f a -> Element (Rec1 f a) #

maximumByEx :: (Element (Rec1 f a) -> Element (Rec1 f a) -> Ordering) -> Rec1 f a -> Element (Rec1 f a) #

minimumByEx :: (Element (Rec1 f a) -> Element (Rec1 f a) -> Ordering) -> Rec1 f a -> Element (Rec1 f a) #

oelem :: Element (Rec1 f a) -> Rec1 f a -> Bool #

onotElem :: Element (Rec1 f a) -> Rec1 f a -> Bool #

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 #

Foldable f => MonoFoldable (WriterT w f a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (WriterT w f a) -> m) -> WriterT w f a -> m #

ofoldr :: (Element (WriterT w f a) -> b -> b) -> b -> WriterT w f a -> b #

ofoldl' :: (a0 -> Element (WriterT w f a) -> a0) -> a0 -> WriterT w f a -> a0 #

otoList :: WriterT w f a -> [Element (WriterT w f a)] #

oall :: (Element (WriterT w f a) -> Bool) -> WriterT w f a -> Bool #

oany :: (Element (WriterT w f a) -> Bool) -> WriterT w f a -> Bool #

onull :: WriterT w f a -> Bool #

olength :: WriterT w f a -> Int #

olength64 :: WriterT w f a -> Int64 #

ocompareLength :: Integral i => WriterT w f a -> i -> Ordering #

otraverse_ :: Applicative f0 => (Element (WriterT w f a) -> f0 b) -> WriterT w f a -> f0 () #

ofor_ :: Applicative f0 => WriterT w f a -> (Element (WriterT w f a) -> f0 b) -> f0 () #

omapM_ :: Applicative m => (Element (WriterT w f a) -> m ()) -> WriterT w f a -> m () #

oforM_ :: Applicative m => WriterT w f a -> (Element (WriterT w f a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (WriterT w f a) -> m a0) -> a0 -> WriterT w f a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (WriterT w f a) -> m) -> WriterT w f a -> m #

ofoldr1Ex :: (Element (WriterT w f a) -> Element (WriterT w f a) -> Element (WriterT w f a)) -> WriterT w f a -> Element (WriterT w f a) #

ofoldl1Ex' :: (Element (WriterT w f a) -> Element (WriterT w f a) -> Element (WriterT w f a)) -> WriterT w f a -> Element (WriterT w f a) #

headEx :: WriterT w f a -> Element (WriterT w f a) #

lastEx :: WriterT w f a -> Element (WriterT w f a) #

unsafeHead :: WriterT w f a -> Element (WriterT w f a) #

unsafeLast :: WriterT w f a -> Element (WriterT w f a) #

maximumByEx :: (Element (WriterT w f a) -> Element (WriterT w f a) -> Ordering) -> WriterT w f a -> Element (WriterT w f a) #

minimumByEx :: (Element (WriterT w f a) -> Element (WriterT w f a) -> Ordering) -> WriterT w f a -> Element (WriterT w f a) #

oelem :: Element (WriterT w f a) -> WriterT w f a -> Bool #

onotElem :: Element (WriterT w f a) -> WriterT w f a -> Bool #

Foldable f => MonoFoldable (WriterT w f a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (WriterT w f a) -> m) -> WriterT w f a -> m #

ofoldr :: (Element (WriterT w f a) -> b -> b) -> b -> WriterT w f a -> b #

ofoldl' :: (a0 -> Element (WriterT w f a) -> a0) -> a0 -> WriterT w f a -> a0 #

otoList :: WriterT w f a -> [Element (WriterT w f a)] #

oall :: (Element (WriterT w f a) -> Bool) -> WriterT w f a -> Bool #

oany :: (Element (WriterT w f a) -> Bool) -> WriterT w f a -> Bool #

onull :: WriterT w f a -> Bool #

olength :: WriterT w f a -> Int #

olength64 :: WriterT w f a -> Int64 #

ocompareLength :: Integral i => WriterT w f a -> i -> Ordering #

otraverse_ :: Applicative f0 => (Element (WriterT w f a) -> f0 b) -> WriterT w f a -> f0 () #

ofor_ :: Applicative f0 => WriterT w f a -> (Element (WriterT w f a) -> f0 b) -> f0 () #

omapM_ :: Applicative m => (Element (WriterT w f a) -> m ()) -> WriterT w f a -> m () #

oforM_ :: Applicative m => WriterT w f a -> (Element (WriterT w f a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (WriterT w f a) -> m a0) -> a0 -> WriterT w f a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (WriterT w f a) -> m) -> WriterT w f a -> m #

ofoldr1Ex :: (Element (WriterT w f a) -> Element (WriterT w f a) -> Element (WriterT w f a)) -> WriterT w f a -> Element (WriterT w f a) #

ofoldl1Ex' :: (Element (WriterT w f a) -> Element (WriterT w f a) -> Element (WriterT w f a)) -> WriterT w f a -> Element (WriterT w f a) #

headEx :: WriterT w f a -> Element (WriterT w f a) #

lastEx :: WriterT w f a -> Element (WriterT w f a) #

unsafeHead :: WriterT w f a -> Element (WriterT w f a) #

unsafeLast :: WriterT w f a -> Element (WriterT w f a) #

maximumByEx :: (Element (WriterT w f a) -> Element (WriterT w f a) -> Ordering) -> WriterT w f a -> Element (WriterT w f a) #

minimumByEx :: (Element (WriterT w f a) -> Element (WriterT w f a) -> Ordering) -> WriterT w f a -> Element (WriterT w f a) #

oelem :: Element (WriterT w f a) -> WriterT w f a -> Bool #

onotElem :: Element (WriterT w f a) -> WriterT w f a -> Bool #

(Foldable f, Foldable g) => MonoFoldable (Product f g a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (Product f g a) -> m) -> Product f g a -> m #

ofoldr :: (Element (Product f g a) -> b -> b) -> b -> Product f g a -> b #

ofoldl' :: (a0 -> Element (Product f g a) -> a0) -> a0 -> Product f g a -> a0 #

otoList :: Product f g a -> [Element (Product f g a)] #

oall :: (Element (Product f g a) -> Bool) -> Product f g a -> Bool #

oany :: (Element (Product f g a) -> Bool) -> Product f g a -> Bool #

onull :: Product f g a -> Bool #

olength :: Product f g a -> Int #

olength64 :: Product f g a -> Int64 #

ocompareLength :: Integral i => Product f g a -> i -> Ordering #

otraverse_ :: Applicative f0 => (Element (Product f g a) -> f0 b) -> Product f g a -> f0 () #

ofor_ :: Applicative f0 => Product f g a -> (Element (Product f g a) -> f0 b) -> f0 () #

omapM_ :: Applicative m => (Element (Product f g a) -> m ()) -> Product f g a -> m () #

oforM_ :: Applicative m => Product f g a -> (Element (Product f g a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (Product f g a) -> m a0) -> a0 -> Product f g a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (Product f g a) -> m) -> Product f g a -> m #

ofoldr1Ex :: (Element (Product f g a) -> Element (Product f g a) -> Element (Product f g a)) -> Product f g a -> Element (Product f g a) #

ofoldl1Ex' :: (Element (Product f g a) -> Element (Product f g a) -> Element (Product f g a)) -> Product f g a -> Element (Product f g a) #

headEx :: Product f g a -> Element (Product f g a) #

lastEx :: Product f g a -> Element (Product f g a) #

unsafeHead :: Product f g a -> Element (Product f g a) #

unsafeLast :: Product f g a -> Element (Product f g a) #

maximumByEx :: (Element (Product f g a) -> Element (Product f g a) -> Ordering) -> Product f g a -> Element (Product f g a) #

minimumByEx :: (Element (Product f g a) -> Element (Product f g a) -> Ordering) -> Product f g a -> Element (Product f g a) #

oelem :: Element (Product f g a) -> Product f g a -> Bool #

onotElem :: Element (Product f g a) -> Product f g a -> Bool #

(Foldable f, Foldable g) => MonoFoldable ((f :*: g) a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element ((f :*: g) a) -> m) -> (f :*: g) a -> m #

ofoldr :: (Element ((f :*: g) a) -> b -> b) -> b -> (f :*: g) a -> b #

ofoldl' :: (a0 -> Element ((f :*: g) a) -> a0) -> a0 -> (f :*: g) a -> a0 #

otoList :: (f :*: g) a -> [Element ((f :*: g) a)] #

oall :: (Element ((f :*: g) a) -> Bool) -> (f :*: g) a -> Bool #

oany :: (Element ((f :*: g) a) -> Bool) -> (f :*: g) a -> Bool #

onull :: (f :*: g) a -> Bool #

olength :: (f :*: g) a -> Int #

olength64 :: (f :*: g) a -> Int64 #

ocompareLength :: Integral i => (f :*: g) a -> i -> Ordering #

otraverse_ :: Applicative f0 => (Element ((f :*: g) a) -> f0 b) -> (f :*: g) a -> f0 () #

ofor_ :: Applicative f0 => (f :*: g) a -> (Element ((f :*: g) a) -> f0 b) -> f0 () #

omapM_ :: Applicative m => (Element ((f :*: g) a) -> m ()) -> (f :*: g) a -> m () #

oforM_ :: Applicative m => (f :*: g) a -> (Element ((f :*: g) a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element ((f :*: g) a) -> m a0) -> a0 -> (f :*: g) a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element ((f :*: g) a) -> m) -> (f :*: g) a -> m #

ofoldr1Ex :: (Element ((f :*: g) a) -> Element ((f :*: g) a) -> Element ((f :*: g) a)) -> (f :*: g) a -> Element ((f :*: g) a) #

ofoldl1Ex' :: (Element ((f :*: g) a) -> Element ((f :*: g) a) -> Element ((f :*: g) a)) -> (f :*: g) a -> Element ((f :*: g) a) #

headEx :: (f :*: g) a -> Element ((f :*: g) a) #

lastEx :: (f :*: g) a -> Element ((f :*: g) a) #

unsafeHead :: (f :*: g) a -> Element ((f :*: g) a) #

unsafeLast :: (f :*: g) a -> Element ((f :*: g) a) #

maximumByEx :: (Element ((f :*: g) a) -> Element ((f :*: g) a) -> Ordering) -> (f :*: g) a -> Element ((f :*: g) a) #

minimumByEx :: (Element ((f :*: g) a) -> Element ((f :*: g) a) -> Ordering) -> (f :*: g) a -> Element ((f :*: g) a) #

oelem :: Element ((f :*: g) a) -> (f :*: g) a -> Bool #

onotElem :: Element ((f :*: g) a) -> (f :*: g) a -> Bool #

(Foldable f, Foldable g) => MonoFoldable ((f :+: g) a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element ((f :+: g) a) -> m) -> (f :+: g) a -> m #

ofoldr :: (Element ((f :+: g) a) -> b -> b) -> b -> (f :+: g) a -> b #

ofoldl' :: (a0 -> Element ((f :+: g) a) -> a0) -> a0 -> (f :+: g) a -> a0 #

otoList :: (f :+: g) a -> [Element ((f :+: g) a)] #

oall :: (Element ((f :+: g) a) -> Bool) -> (f :+: g) a -> Bool #

oany :: (Element ((f :+: g) a) -> Bool) -> (f :+: g) a -> Bool #

onull :: (f :+: g) a -> Bool #

olength :: (f :+: g) a -> Int #

olength64 :: (f :+: g) a -> Int64 #

ocompareLength :: Integral i => (f :+: g) a -> i -> Ordering #

otraverse_ :: Applicative f0 => (Element ((f :+: g) a) -> f0 b) -> (f :+: g) a -> f0 () #

ofor_ :: Applicative f0 => (f :+: g) a -> (Element ((f :+: g) a) -> f0 b) -> f0 () #

omapM_ :: Applicative m => (Element ((f :+: g) a) -> m ()) -> (f :+: g) a -> m () #

oforM_ :: Applicative m => (f :+: g) a -> (Element ((f :+: g) a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element ((f :+: g) a) -> m a0) -> a0 -> (f :+: g) a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element ((f :+: g) a) -> m) -> (f :+: g) a -> m #

ofoldr1Ex :: (Element ((f :+: g) a) -> Element ((f :+: g) a) -> Element ((f :+: g) a)) -> (f :+: g) a -> Element ((f :+: g) a) #

ofoldl1Ex' :: (Element ((f :+: g) a) -> Element ((f :+: g) a) -> Element ((f :+: g) a)) -> (f :+: g) a -> Element ((f :+: g) a) #

headEx :: (f :+: g) a -> Element ((f :+: g) a) #

lastEx :: (f :+: g) a -> Element ((f :+: g) a) #

unsafeHead :: (f :+: g) a -> Element ((f :+: g) a) #

unsafeLast :: (f :+: g) a -> Element ((f :+: g) a) #

maximumByEx :: (Element ((f :+: g) a) -> Element ((f :+: g) a) -> Ordering) -> (f :+: g) a -> Element ((f :+: g) a) #

minimumByEx :: (Element ((f :+: g) a) -> Element ((f :+: g) a) -> Ordering) -> (f :+: g) a -> Element ((f :+: g) a) #

oelem :: Element ((f :+: g) a) -> (f :+: g) a -> Bool #

onotElem :: Element ((f :+: g) a) -> (f :+: g) a -> Bool #

MonoFoldable (K1 i c a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (K1 i c a) -> m) -> K1 i c a -> m #

ofoldr :: (Element (K1 i c a) -> b -> b) -> b -> K1 i c a -> b #

ofoldl' :: (a0 -> Element (K1 i c a) -> a0) -> a0 -> K1 i c a -> a0 #

otoList :: K1 i c a -> [Element (K1 i c a)] #

oall :: (Element (K1 i c a) -> Bool) -> K1 i c a -> Bool #

oany :: (Element (K1 i c a) -> Bool) -> K1 i c a -> Bool #

onull :: K1 i c a -> Bool #

olength :: K1 i c a -> Int #

olength64 :: K1 i c a -> Int64 #

ocompareLength :: Integral i0 => K1 i c a -> i0 -> Ordering #

otraverse_ :: Applicative f => (Element (K1 i c a) -> f b) -> K1 i c a -> f () #

ofor_ :: Applicative f => K1 i c a -> (Element (K1 i c a) -> f b) -> f () #

omapM_ :: Applicative m => (Element (K1 i c a) -> m ()) -> K1 i c a -> m () #

oforM_ :: Applicative m => K1 i c a -> (Element (K1 i c a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (K1 i c a) -> m a0) -> a0 -> K1 i c a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (K1 i c a) -> m) -> K1 i c a -> m #

ofoldr1Ex :: (Element (K1 i c a) -> Element (K1 i c a) -> Element (K1 i c a)) -> K1 i c a -> Element (K1 i c a) #

ofoldl1Ex' :: (Element (K1 i c a) -> Element (K1 i c a) -> Element (K1 i c a)) -> K1 i c a -> Element (K1 i c a) #

headEx :: K1 i c a -> Element (K1 i c a) #

lastEx :: K1 i c a -> Element (K1 i c a) #

unsafeHead :: K1 i c a -> Element (K1 i c a) #

unsafeLast :: K1 i c a -> Element (K1 i c a) #

maximumByEx :: (Element (K1 i c a) -> Element (K1 i c a) -> Ordering) -> K1 i c a -> Element (K1 i c a) #

minimumByEx :: (Element (K1 i c a) -> Element (K1 i c a) -> Ordering) -> K1 i c a -> Element (K1 i c a) #

oelem :: Element (K1 i c a) -> K1 i c a -> Bool #

onotElem :: Element (K1 i c a) -> K1 i c a -> Bool #

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

(Foldable f, Foldable g) => MonoFoldable ((f :.: g) a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element ((f :.: g) a) -> m) -> (f :.: g) a -> m #

ofoldr :: (Element ((f :.: g) a) -> b -> b) -> b -> (f :.: g) a -> b #

ofoldl' :: (a0 -> Element ((f :.: g) a) -> a0) -> a0 -> (f :.: g) a -> a0 #

otoList :: (f :.: g) a -> [Element ((f :.: g) a)] #

oall :: (Element ((f :.: g) a) -> Bool) -> (f :.: g) a -> Bool #

oany :: (Element ((f :.: g) a) -> Bool) -> (f :.: g) a -> Bool #

onull :: (f :.: g) a -> Bool #

olength :: (f :.: g) a -> Int #

olength64 :: (f :.: g) a -> Int64 #

ocompareLength :: Integral i => (f :.: g) a -> i -> Ordering #

otraverse_ :: Applicative f0 => (Element ((f :.: g) a) -> f0 b) -> (f :.: g) a -> f0 () #

ofor_ :: Applicative f0 => (f :.: g) a -> (Element ((f :.: g) a) -> f0 b) -> f0 () #

omapM_ :: Applicative m => (Element ((f :.: g) a) -> m ()) -> (f :.: g) a -> m () #

oforM_ :: Applicative m => (f :.: g) a -> (Element ((f :.: g) a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element ((f :.: g) a) -> m a0) -> a0 -> (f :.: g) a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element ((f :.: g) a) -> m) -> (f :.: g) a -> m #

ofoldr1Ex :: (Element ((f :.: g) a) -> Element ((f :.: g) a) -> Element ((f :.: g) a)) -> (f :.: g) a -> Element ((f :.: g) a) #

ofoldl1Ex' :: (Element ((f :.: g) a) -> Element ((f :.: g) a) -> Element ((f :.: g) a)) -> (f :.: g) a -> Element ((f :.: g) a) #

headEx :: (f :.: g) a -> Element ((f :.: g) a) #

lastEx :: (f :.: g) a -> Element ((f :.: g) a) #

unsafeHead :: (f :.: g) a -> Element ((f :.: g) a) #

unsafeLast :: (f :.: g) a -> Element ((f :.: g) a) #

maximumByEx :: (Element ((f :.: g) a) -> Element ((f :.: g) a) -> Ordering) -> (f :.: g) a -> Element ((f :.: g) a) #

minimumByEx :: (Element ((f :.: g) a) -> Element ((f :.: g) a) -> Ordering) -> (f :.: g) a -> Element ((f :.: g) a) #

oelem :: Element ((f :.: g) a) -> (f :.: g) a -> Bool #

onotElem :: Element ((f :.: g) a) -> (f :.: g) a -> Bool #

Foldable f => MonoFoldable (M1 i c f a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (M1 i c f a) -> m) -> M1 i c f a -> m #

ofoldr :: (Element (M1 i c f a) -> b -> b) -> b -> M1 i c f a -> b #

ofoldl' :: (a0 -> Element (M1 i c f a) -> a0) -> a0 -> M1 i c f a -> a0 #

otoList :: M1 i c f a -> [Element (M1 i c f a)] #

oall :: (Element (M1 i c f a) -> Bool) -> M1 i c f a -> Bool #

oany :: (Element (M1 i c f a) -> Bool) -> M1 i c f a -> Bool #

onull :: M1 i c f a -> Bool #

olength :: M1 i c f a -> Int #

olength64 :: M1 i c f a -> Int64 #

ocompareLength :: Integral i0 => M1 i c f a -> i0 -> Ordering #

otraverse_ :: Applicative f0 => (Element (M1 i c f a) -> f0 b) -> M1 i c f a -> f0 () #

ofor_ :: Applicative f0 => M1 i c f a -> (Element (M1 i c f a) -> f0 b) -> f0 () #

omapM_ :: Applicative m => (Element (M1 i c f a) -> m ()) -> M1 i c f a -> m () #

oforM_ :: Applicative m => M1 i c f a -> (Element (M1 i c f a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (M1 i c f a) -> m a0) -> a0 -> M1 i c f a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (M1 i c f a) -> m) -> M1 i c f a -> m #

ofoldr1Ex :: (Element (M1 i c f a) -> Element (M1 i c f a) -> Element (M1 i c f a)) -> M1 i c f a -> Element (M1 i c f a) #

ofoldl1Ex' :: (Element (M1 i c f a) -> Element (M1 i c f a) -> Element (M1 i c f a)) -> M1 i c f a -> Element (M1 i c f a) #

headEx :: M1 i c f a -> Element (M1 i c f a) #

lastEx :: M1 i c f a -> Element (M1 i c f a) #

unsafeHead :: M1 i c f a -> Element (M1 i c f a) #

unsafeLast :: M1 i c f a -> Element (M1 i c f a) #

maximumByEx :: (Element (M1 i c f a) -> Element (M1 i c f a) -> Ordering) -> M1 i c f a -> Element (M1 i c f a) #

minimumByEx :: (Element (M1 i c f a) -> Element (M1 i c f a) -> Ordering) -> M1 i c f a -> Element (M1 i c f a) #

oelem :: Element (M1 i c f a) -> M1 i c f a -> Bool #

onotElem :: Element (M1 i c f a) -> M1 i c f a -> Bool #

class MonoFunctor mono where #

Monomorphic containers that can be mapped over.

Minimal complete definition

Nothing

Methods

omap :: (Element mono -> Element mono) -> mono -> mono #

Map over a monomorphic container

Instances

Instances details
MonoFunctor ByteString 
Instance details

Defined in Data.MonoTraversable

MonoFunctor ByteString 
Instance details

Defined in Data.MonoTraversable

MonoFunctor Text 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element Text -> Element Text) -> Text -> Text #

MonoFunctor Text 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element Text -> Element Text) -> Text -> Text #

MonoFunctor (ZipList a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (ZipList a) -> Element (ZipList a)) -> ZipList a -> ZipList a #

MonoFunctor (Identity a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Identity a) -> Element (Identity a)) -> Identity a -> Identity a #

MonoFunctor (Option a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Option a) -> Element (Option a)) -> Option a -> Option a #

MonoFunctor (NonEmpty a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (NonEmpty a) -> Element (NonEmpty a)) -> NonEmpty a -> NonEmpty a #

MonoFunctor (Par1 a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Par1 a) -> Element (Par1 a)) -> Par1 a -> Par1 a #

MonoFunctor (IntMap a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (IntMap a) -> Element (IntMap a)) -> IntMap a -> IntMap a #

MonoFunctor (Seq a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Seq a) -> Element (Seq a)) -> Seq a -> Seq a #

MonoFunctor (ViewL a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (ViewL a) -> Element (ViewL a)) -> ViewL a -> ViewL a #

MonoFunctor (ViewR a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (ViewR a) -> Element (ViewR a)) -> ViewR a -> ViewR a #

MonoFunctor (Tree a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Tree a) -> Element (Tree a)) -> Tree a -> Tree a #

MonoFunctor (IO a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (IO a) -> Element (IO a)) -> IO a -> IO a #

MonoFunctor mono => MonoFunctor (NonNull mono) 
Instance details

Defined in Data.NonNull

Methods

omap :: (Element (NonNull mono) -> Element (NonNull mono)) -> NonNull mono -> NonNull mono #

MonoFunctor (Vector a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Vector a) -> Element (Vector a)) -> Vector a -> Vector a #

Storable a => MonoFunctor (Vector a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Vector a) -> Element (Vector a)) -> Vector a -> Vector a #

Unbox a => MonoFunctor (Vector a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Vector a) -> Element (Vector a)) -> Vector a -> Vector a #

MonoFunctor (Maybe a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Maybe a) -> Element (Maybe a)) -> Maybe a -> Maybe a #

MonoFunctor [a] 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element [a] -> Element [a]) -> [a] -> [a] #

Monad m => MonoFunctor (WrappedMonad m a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (WrappedMonad m a) -> Element (WrappedMonad m a)) -> WrappedMonad m a -> WrappedMonad m a #

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 #

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 #

MonoFunctor (Arg a b) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Arg a b) -> Element (Arg a b)) -> Arg a b -> Arg a b #

MonoFunctor (U1 a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (U1 a) -> Element (U1 a)) -> U1 a -> U1 a #

MonoFunctor (V1 a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (V1 a) -> Element (V1 a)) -> V1 a -> V1 a #

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 #

MonoFunctor mono => MonoFunctor (WrappedMono mono a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (WrappedMono mono a) -> Element (WrappedMono mono a)) -> WrappedMono mono a -> WrappedMono mono a #

Functor f => MonoFunctor (WrappedPoly f a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (WrappedPoly f a) -> Element (WrappedPoly f a)) -> WrappedPoly f a -> WrappedPoly f a #

Functor m => MonoFunctor (ListT m a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (ListT m a) -> Element (ListT m a)) -> ListT m a -> ListT m a #

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 #

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 #

MonoFunctor (r -> a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (r -> a) -> Element (r -> a)) -> (r -> a) -> r -> a #

MonoFunctor (a, b) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (a, b) -> Element (a, b)) -> (a, b) -> (a, b) #

Arrow a => MonoFunctor (WrappedArrow a b c) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (WrappedArrow a b c) -> Element (WrappedArrow a b c)) -> WrappedArrow a b c -> WrappedArrow a b c #

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 #

Functor f => MonoFunctor (Rec1 f a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Rec1 f a) -> Element (Rec1 f a)) -> Rec1 f a -> Rec1 f a #

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 #

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 #

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 #

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 #

Functor m => MonoFunctor (WriterT w m a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (WriterT w m a) -> Element (WriterT w m a)) -> WriterT w m a -> WriterT w m a #

Functor m => MonoFunctor (WriterT w m a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (WriterT w m a) -> Element (WriterT w m a)) -> WriterT w m a -> WriterT w m a #

(Functor f, Functor g) => MonoFunctor (Product f g a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Product f g a) -> Element (Product f g a)) -> Product f g a -> Product f g a #

(Functor f, Functor g) => MonoFunctor ((f :*: g) a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element ((f :*: g) a) -> Element ((f :*: g) a)) -> (f :*: g) a -> (f :*: g) a #

(Functor f, Functor g) => MonoFunctor ((f :+: g) a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element ((f :+: g) a) -> Element ((f :+: g) a)) -> (f :+: g) a -> (f :+: g) a #

MonoFunctor (K1 i c a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (K1 i c a) -> Element (K1 i c a)) -> K1 i c a -> K1 i c a #

Functor m => MonoFunctor (ContT r m a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (ContT r m a) -> Element (ContT r m a)) -> ContT r m a -> ContT r m a #

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

(Functor f, Functor g) => MonoFunctor ((f :.: g) a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element ((f :.: g) a) -> Element ((f :.: g) a)) -> (f :.: g) a -> (f :.: g) a #

Functor f => MonoFunctor (M1 i c f a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (M1 i c f a) -> Element (M1 i c f a)) -> M1 i c f a -> M1 i c f a #

Functor m => MonoFunctor (RWST r w s m a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (RWST r w s m a) -> Element (RWST r w s m a)) -> RWST r w s m a -> RWST r w s m a #

Functor m => MonoFunctor (RWST r w s m a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (RWST r w s m a) -> Element (RWST r w s m a)) -> RWST r w s m a -> RWST r w s m a #

type family Element mono #

Type family for getting the type of the elements of a monomorphic container.

Instances

Instances details
type Element ByteString 
Instance details

Defined in Data.MonoTraversable

type Element ByteString 
Instance details

Defined in Data.MonoTraversable

type Element IntSet 
Instance details

Defined in Data.MonoTraversable

type Element Text 
Instance details

Defined in Data.MonoTraversable

type Element Text 
Instance details

Defined in Data.MonoTraversable

type Element (ZipList a) 
Instance details

Defined in Data.MonoTraversable

type Element (ZipList a) = a
type Element (Identity a) 
Instance details

Defined in Data.MonoTraversable

type Element (Identity a) = a
type Element (Option a) 
Instance details

Defined in Data.MonoTraversable

type Element (Option a) = a
type Element (NonEmpty a) 
Instance details

Defined in Data.MonoTraversable

type Element (NonEmpty a) = a
type Element (Par1 a) 
Instance details

Defined in Data.MonoTraversable

type Element (Par1 a) = a
type Element (IntMap a) 
Instance details

Defined in Data.MonoTraversable

type Element (IntMap a) = a
type Element (Seq a) 
Instance details

Defined in Data.MonoTraversable

type Element (Seq a) = a
type Element (ViewL a) 
Instance details

Defined in Data.MonoTraversable

type Element (ViewL a) = a
type Element (ViewR a) 
Instance details

Defined in Data.MonoTraversable

type Element (ViewR a) = a
type Element (Set e) 
Instance details

Defined in Data.MonoTraversable

type Element (Set e) = e
type Element (Tree a) 
Instance details

Defined in Data.MonoTraversable

type Element (Tree a) = a
type Element (DList a) 
Instance details

Defined in Data.MonoTraversable.Instances

type Element (DList a) = a
type Element (IO a) 
Instance details

Defined in Data.MonoTraversable

type Element (IO a) = a
type Element (NonNull mono) 
Instance details

Defined in Data.NonNull

type Element (NonNull mono) = Element mono
type Element (HashSet e) 
Instance details

Defined in Data.MonoTraversable

type Element (HashSet e) = e
type Element (Vector a) 
Instance details

Defined in Data.MonoTraversable

type Element (Vector a) = a
type Element (Vector a) 
Instance details

Defined in Data.MonoTraversable

type Element (Vector a) = a
type Element (Vector a) 
Instance details

Defined in Data.MonoTraversable

type Element (Vector a) = a
type Element (Maybe a) 
Instance details

Defined in Data.MonoTraversable

type Element (Maybe a) = a
type Element [a] 
Instance details

Defined in Data.MonoTraversable

type Element [a] = a
type Element (WrappedMonad m a) 
Instance details

Defined in Data.MonoTraversable

type Element (WrappedMonad m a) = a
type Element (Either a b) 
Instance details

Defined in Data.MonoTraversable

type Element (Either a b) = b
type Element (Proxy a) 
Instance details

Defined in Data.MonoTraversable

type Element (Proxy a) = a
type Element (Arg a b) 
Instance details

Defined in Data.MonoTraversable

type Element (Arg a b) = b
type Element (U1 a) 
Instance details

Defined in Data.MonoTraversable

type Element (U1 a) = a
type Element (V1 a) 
Instance details

Defined in Data.MonoTraversable

type Element (V1 a) = a
type Element (Map k v) 
Instance details

Defined in Data.MonoTraversable

type Element (Map k v) = v
type Element (WrappedMono mono a) 
Instance details

Defined in Data.MonoTraversable

type Element (WrappedMono mono a) = Element mono
type Element (WrappedPoly f a) 
Instance details

Defined in Data.MonoTraversable

type Element (WrappedPoly f a) = a
type Element (MaybeApply f a) 
Instance details

Defined in Data.MonoTraversable.Instances

type Element (MaybeApply f a) = a
type Element (WrappedApplicative f a) 
Instance details

Defined in Data.MonoTraversable.Instances

type Element (ListT m a) 
Instance details

Defined in Data.MonoTraversable

type Element (ListT m a) = a
type Element (MaybeT m a) 
Instance details

Defined in Data.MonoTraversable

type Element (MaybeT m a) = a
type Element (HashMap k v) 
Instance details

Defined in Data.MonoTraversable

type Element (HashMap k v) = v
type Element (r -> a) 
Instance details

Defined in Data.MonoTraversable

type Element (r -> a) = a
type Element (a, b) 
Instance details

Defined in Data.MonoTraversable

type Element (a, b) = b
type Element (WrappedArrow a b c) 
Instance details

Defined in Data.MonoTraversable

type Element (WrappedArrow a b c) = c
type Element (Const m a) 
Instance details

Defined in Data.MonoTraversable

type Element (Const m a) = a
type Element (Rec1 f a) 
Instance details

Defined in Data.MonoTraversable

type Element (Rec1 f a) = a
type Element (EnvT e w a) 
Instance details

Defined in Data.MonoTraversable.Instances

type Element (EnvT e w a) = a
type Element (StoreT s w a) 
Instance details

Defined in Data.MonoTraversable.Instances

type Element (StoreT s w a) = a
type Element (TracedT m w a) 
Instance details

Defined in Data.MonoTraversable.Instances

type Element (TracedT m w a) = a
type Element (Static f a b) 
Instance details

Defined in Data.MonoTraversable.Instances

type Element (Static f a b) = b
type Element (IdentityT m a) 
Instance details

Defined in Data.MonoTraversable

type Element (IdentityT m a) = a
type Element (ReaderT r m a) 
Instance details

Defined in Data.MonoTraversable

type Element (ReaderT r m a) = a
type Element (StateT s m a) 
Instance details

Defined in Data.MonoTraversable

type Element (StateT s m a) = a
type Element (StateT s m a) 
Instance details

Defined in Data.MonoTraversable

type Element (StateT s m a) = a
type Element (WriterT w m a) 
Instance details

Defined in Data.MonoTraversable

type Element (WriterT w m a) = a
type Element (WriterT w m a) 
Instance details

Defined in Data.MonoTraversable

type Element (WriterT w m a) = a
type Element (Product f g a) 
Instance details

Defined in Data.MonoTraversable

type Element (Product f g a) = a
type Element ((f :*: g) a) 
Instance details

Defined in Data.MonoTraversable

type Element ((f :*: g) a) = a
type Element ((f :+: g) a) 
Instance details

Defined in Data.MonoTraversable

type Element ((f :+: g) a) = a
type Element (K1 i c a) 
Instance details

Defined in Data.MonoTraversable

type Element (K1 i c a) = a
type Element (Cokleisli w a b) 
Instance details

Defined in Data.MonoTraversable.Instances

type Element (Cokleisli w a b) = b
type Element (ContT r m a) 
Instance details

Defined in Data.MonoTraversable

type Element (ContT r m a) = a
type Element (Compose f g a) 
Instance details

Defined in Data.MonoTraversable

type Element (Compose f g a) = a
type Element ((f :.: g) a) 
Instance details

Defined in Data.MonoTraversable

type Element ((f :.: g) a) = a
type Element (M1 i c f a) 
Instance details

Defined in Data.MonoTraversable

type Element (M1 i c f a) = a
type Element (RWST r w s m a) 
Instance details

Defined in Data.MonoTraversable

type Element (RWST r w s m a) = a
type Element (RWST r w s m a) 
Instance details

Defined in Data.MonoTraversable

type Element (RWST r w s m a) = a

replaceElem :: (MonoFunctor mono, Eq (Element mono)) => Element mono -> Element mono -> mono -> mono #

replaceElem old new replaces all old elements with new.

Since: mono-traversable-1.0.1

headMay :: MonoFoldable mono => mono -> Maybe (Element mono) #

Safe version of headEx.

Returns Nothing instead of throwing an exception when encountering an empty monomorphic container.

lastMay :: MonoFoldable mono => mono -> Maybe (Element mono) #

Safe version of lastEx.

Returns Nothing instead of throwing an exception when encountering an empty monomorphic container.

osum :: (MonoFoldable mono, Num (Element mono)) => mono -> Element mono #

osum computes the sum of the numbers of a monomorphic container.

oproduct :: (MonoFoldable mono, Num (Element mono)) => mono -> Element mono #

oproduct computes the product of the numbers of a monomorphic container.

oand :: (Element mono ~ Bool, MonoFoldable mono) => mono -> Bool #

Are all of the elements True?

Since: mono-traversable-0.6.0

oor :: (Element mono ~ Bool, MonoFoldable mono) => mono -> Bool #

Are any of the elements True?

Since: mono-traversable-0.6.0

oconcatMap :: (MonoFoldable mono, Monoid m) => (Element mono -> m) -> mono -> m #

Synonym for ofoldMap

Since: mono-traversable-1.0.0

ofold :: (MonoFoldable mono, Monoid (Element mono)) => mono -> Element mono #

Monoidally combine all values in the container

Since: mono-traversable-1.0.0

oconcat :: (MonoFoldable mono, Monoid (Element mono)) => mono -> Element mono #

Synonym for ofold

Since: mono-traversable-1.0.0

ofoldM :: (MonoFoldable mono, Monad m) => (a -> Element mono -> m a) -> a -> mono -> m a #

Synonym for ofoldlM

Since: mono-traversable-1.0.0

osequence_ :: (Applicative m, MonoFoldable mono, Element mono ~ m ()) => mono -> m () #

Perform all actions in the given container

Since: mono-traversable-1.0.0

maximumEx :: (MonoFoldable mono, Ord (Element mono)) => mono -> Element mono #

Get the minimum element of a monomorphic container.

Note: this is a partial function. On an empty MonoFoldable, it will throw an exception.

See maximum from Data.NonNull for a total version of this function.

minimumEx :: (MonoFoldable mono, Ord (Element mono)) => mono -> Element mono #

Get the maximum element of a monomorphic container.

Note: this is a partial function. On an empty MonoFoldable, it will throw an exception.

See minimum from Data.NonNull for a total version of this function.

maximumMay :: (MonoFoldable mono, Ord (Element mono)) => mono -> Maybe (Element mono) #

Safe version of maximumEx.

Returns Nothing instead of throwing an exception when encountering an empty monomorphic container.

maximumByMay :: MonoFoldable mono => (Element mono -> Element mono -> Ordering) -> mono -> Maybe (Element mono) #

Safe version of maximumByEx.

Returns Nothing instead of throwing an exception when encountering an empty monomorphic container.

minimumMay :: (MonoFoldable mono, Ord (Element mono)) => mono -> Maybe (Element mono) #

Safe version of minimumEx.

Returns Nothing instead of throwing an exception when encountering an empty monomorphic container.

minimumByMay :: MonoFoldable mono => (Element mono -> Element mono -> Ordering) -> mono -> Maybe (Element mono) #

Safe version of minimumByEx.

Returns Nothing instead of throwing an exception when encountering an empty monomorphic container.

ofor :: (MonoTraversable mono, Applicative f) => mono -> (Element mono -> f (Element mono)) -> f mono #

ofor is otraverse with its arguments flipped.

oforM :: (MonoTraversable mono, Applicative f) => mono -> (Element mono -> f (Element mono)) -> f mono #

oforM is omapM with its arguments flipped.

ofoldlUnwrap :: MonoFoldable mono => (x -> Element mono -> x) -> x -> (x -> b) -> mono -> b #

A strict left fold, together with an unwrap function.

This is convenient when the accumulator value is not the same as the final expected type. It is provided mainly for integration with the foldl package, to be used in conjunction with purely.

Since: mono-traversable-0.3.1

ofoldMUnwrap :: (Monad m, MonoFoldable mono) => (x -> Element mono -> m x) -> m x -> (x -> m b) -> mono -> m b #

A monadic strict left fold, together with an unwrap function.

Similar to foldlUnwrap, but allows monadic actions. To be used with impurely from foldl.

Since: mono-traversable-0.3.1

ointercalate :: (MonoFoldable mono, Monoid (Element mono)) => Element mono -> mono -> Element mono #

intercalate seq seqs inserts seq in between seqs and concatenates the result.

Since: mono-traversable-1.0.0

unwrapMono :: WrappedMono mono a -> mono #

Unwraps a WrappedMono.

Since: mono-traversable-1.0.14.0

class SetContainer set => HasKeysSet set where #

Type class for maps whose keys can be converted into sets.

Associated Types

type KeySet set #

Type of the key set.

Methods

keysSet :: set -> KeySet set #

Convert a map into a set of its keys.

Instances

Instances details
HasKeysSet (IntMap v) 
Instance details

Defined in Data.Containers

Associated Types

type KeySet (IntMap v) #

Methods

keysSet :: IntMap v -> KeySet (IntMap v) #

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

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

type family KeySet set #

Type of the key set.

Instances

Instances details
type KeySet (IntMap v) 
Instance details

Defined in Data.Containers

type KeySet (IntMap v) = IntSet
type KeySet (Map k v) 
Instance details

Defined in Data.Containers

type KeySet (Map k v) = Set k
type KeySet (HashMap k v) 
Instance details

Defined in Data.Containers

type KeySet (HashMap k v) = HashSet k

class MonoFunctor mono => MonoZip mono where #

Zip operations on MonoFunctors.

Methods

ozipWith :: (Element mono -> Element mono -> Element mono) -> mono -> mono -> mono #

Combine each element of two MonoZips using a supplied function.

ozip :: mono -> mono -> [(Element mono, Element mono)] #

Take two MonoZips and return a list of the pairs of their elements.

ounzip :: [(Element mono, Element mono)] -> (mono, mono) #

Take a list of pairs of elements and return a MonoZip of the first components and a MonoZip of the second components.

class (SetContainer set, Element set ~ ContainerKey set) => IsSet set where #

Polymorphic typeclass for interacting with different set types

Minimal complete definition

insertSet, deleteSet, singletonSet, setFromList, setToList

Methods

insertSet :: Element set -> set -> set #

Insert a value into a set.

deleteSet :: Element set -> set -> set #

Delete a value from a set.

singletonSet :: Element set -> set #

Create a set from a single element.

setFromList :: [Element set] -> set #

Convert a list to a set.

setToList :: set -> [Element set] #

Convert a set to a list.

filterSet :: (Element set -> Bool) -> set -> set #

Filter values in a set.

Since: mono-traversable-1.0.12.0

Instances

Instances details
IsSet IntSet 
Instance details

Defined in Data.Containers

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 #

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

class (MonoTraversable map, SetContainer map) => IsMap map where #

Polymorphic typeclass for interacting with different map types

Associated Types

type MapValue map #

In some cases, MapValue and Element will be different, e.g., the IsMap instance of associated lists.

Methods

lookup :: ContainerKey map -> map -> Maybe (MapValue map) #

Look up a value in a map with a specified key.

insertMap :: ContainerKey map -> MapValue map -> map -> map #

Insert a key-value pair into a map.

deleteMap :: ContainerKey map -> map -> map #

Delete a key-value pair of a map using a specified key.

singletonMap :: ContainerKey map -> MapValue map -> map #

Create a map from a single key-value pair.

mapFromList :: [(ContainerKey map, MapValue map)] -> map #

Convert a list of key-value pairs to a map

mapToList :: map -> [(ContainerKey map, MapValue map)] #

Convert a map to a list of key-value pairs.

findWithDefault :: MapValue map -> ContainerKey map -> map -> MapValue map #

Like lookup, but uses a default value when the key does not exist in the map.

insertWith #

Arguments

:: (MapValue map -> MapValue map -> MapValue map)

function that accepts the new value and the previous value and returns the value that will be set in the map.

-> ContainerKey map

key

-> MapValue map

new value to insert

-> map

input map

-> map

resulting map

Insert a key-value pair into a map.

Inserts the value directly if the key does not exist in the map. Otherwise, apply a supplied function that accepts the new value and the previous value and insert that result into the map.

insertWithKey #

Arguments

:: (ContainerKey map -> MapValue map -> MapValue map -> MapValue map)

function that accepts the key, the new value, and the previous value and returns the value that will be set in the map.

-> ContainerKey map

key

-> MapValue map

new value to insert

-> map

input map

-> map

resulting map

Insert a key-value pair into a map.

Inserts the value directly if the key does not exist in the map. Otherwise, apply a supplied function that accepts the key, the new value, and the previous value and insert that result into the map.

insertLookupWithKey #

Arguments

:: (ContainerKey map -> MapValue map -> MapValue map -> MapValue map)

function that accepts the key, the new value, and the previous value and returns the value that will be set in the map.

-> ContainerKey map

key

-> MapValue map

new value to insert

-> map

input map

-> (Maybe (MapValue map), map)

previous value and the resulting map

Insert a key-value pair into a map, return the previous key's value if it existed.

Inserts the value directly if the key does not exist in the map. Otherwise, apply a supplied function that accepts the key, the new value, and the previous value and insert that result into the map.

adjustMap #

Arguments

:: (MapValue map -> MapValue map)

function to apply to the previous value

-> ContainerKey map

key

-> map

input map

-> map

resulting map

Apply a function to the value of a given key.

Returns the input map when the key-value pair does not exist.

adjustWithKey #

Arguments

:: (ContainerKey map -> MapValue map -> MapValue map)

function that accepts the key and the previous value and returns the new value

-> ContainerKey map

key

-> map

input map

-> map

resulting map

Equivalent to adjustMap, but the function accepts the key, as well as the previous value.

updateMap #

Arguments

:: (MapValue map -> Maybe (MapValue map))

function that accepts the previous value and returns the new value or Nothing

-> ContainerKey map

key

-> map

input map

-> map

resulting map

Apply a function to the value of a given key.

If the function returns Nothing, this deletes the key-value pair.

Returns the input map when the key-value pair does not exist.

updateWithKey #

Arguments

:: (ContainerKey map -> MapValue map -> Maybe (MapValue map))

function that accepts the key and the previous value and returns the new value or Nothing

-> ContainerKey map

key

-> map

input map

-> map

resulting map

Equivalent to updateMap, but the function accepts the key, as well as the previous value.

updateLookupWithKey #

Arguments

:: (ContainerKey map -> MapValue map -> Maybe (MapValue map))

function that accepts the key and the previous value and returns the new value or Nothing

-> ContainerKey map

key

-> map

input map

-> (Maybe (MapValue map), map)

previous/new value and the resulting map

Apply a function to the value of a given key.

If the map does not contain the key this returns Nothing and the input map.

If the map does contain the key but the function returns Nothing, this returns the previous value and the map with the key-value pair removed.

If the map contains the key and the function returns a value, this returns the new value and the map with the key-value pair with the new value.

alterMap #

Arguments

:: (Maybe (MapValue map) -> Maybe (MapValue map))

function that accepts the previous value and returns the new value or Nothing

-> ContainerKey map

key

-> map

input map

-> map

resulting map

Update/Delete the value of a given key.

Applies a function to previous value of a given key, if it results in Nothing delete the key-value pair from the map, otherwise replace the previous value with the new value.

unionWith #

Arguments

:: (MapValue map -> MapValue map -> MapValue map)

function that accepts the first map's value and the second map's value and returns the new value that will be used

-> map

first map

-> map

second map

-> map

resulting map

Combine two maps.

When a key exists in both maps, apply a function to both of the values and use the result of that as the value of the key in the resulting map.

unionWithKey #

Arguments

:: (ContainerKey map -> MapValue map -> MapValue map -> MapValue map)

function that accepts the key, the first map's value and the second map's value and returns the new value that will be used

-> map

first map

-> map

second map

-> map

resulting map

unionsWith #

Arguments

:: (MapValue map -> MapValue map -> MapValue map)

function that accepts the first map's value and the second map's value and returns the new value that will be used

-> [map]

input list of maps

-> map

resulting map

Combine a list of maps.

When a key exists in two different maps, apply a function to both of the values and use the result of that as the value of the key in the resulting map.

mapWithKey #

Arguments

:: (ContainerKey map -> MapValue map -> MapValue map)

function that accepts the key and the previous value and returns the new value

-> map

input map

-> map

resulting map

Apply a function over every key-value pair of a map.

omapKeysWith #

Arguments

:: (MapValue map -> MapValue map -> MapValue map)

function that accepts the first map's value and the second map's value and returns the new value that will be used

-> (ContainerKey map -> ContainerKey map)

function that accepts the previous key and returns the new key

-> map

input map

-> map

resulting map

Apply a function over every key of a pair and run unionsWith over the results.

filterMap :: (MapValue map -> Bool) -> map -> map #

Filter values in a map.

Since: mono-traversable-1.0.9.0

Instances

Instances details
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 #

Eq key => IsMap [(key, value)] 
Instance details

Defined in Data.Containers

Associated Types

type MapValue [(key, value)] #

Methods

lookup :: ContainerKey [(key, value)] -> [(key, value)] -> Maybe (MapValue [(key, value)]) #

insertMap :: ContainerKey [(key, value)] -> MapValue [(key, value)] -> [(key, value)] -> [(key, value)] #

deleteMap :: ContainerKey [(key, value)] -> [(key, value)] -> [(key, value)] #

singletonMap :: ContainerKey [(key, value)] -> MapValue [(key, value)] -> [(key, value)] #

mapFromList :: [(ContainerKey [(key, value)], MapValue [(key, value)])] -> [(key, value)] #

mapToList :: [(key, value)] -> [(ContainerKey [(key, value)], MapValue [(key, value)])] #

findWithDefault :: MapValue [(key, value)] -> ContainerKey [(key, value)] -> [(key, value)] -> MapValue [(key, value)] #

insertWith :: (MapValue [(key, value)] -> MapValue [(key, value)] -> MapValue [(key, value)]) -> ContainerKey [(key, value)] -> MapValue [(key, value)] -> [(key, value)] -> [(key, value)] #

insertWithKey :: (ContainerKey [(key, value)] -> MapValue [(key, value)] -> MapValue [(key, value)] -> MapValue [(key, value)]) -> ContainerKey [(key, value)] -> MapValue [(key, value)] -> [(key, value)] -> [(key, value)] #

insertLookupWithKey :: (ContainerKey [(key, value)] -> MapValue [(key, value)] -> MapValue [(key, value)] -> MapValue [(key, value)]) -> ContainerKey [(key, value)] -> MapValue [(key, value)] -> [(key, value)] -> (Maybe (MapValue [(key, value)]), [(key, value)]) #

adjustMap :: (MapValue [(key, value)] -> MapValue [(key, value)]) -> ContainerKey [(key, value)] -> [(key, value)] -> [(key, value)] #

adjustWithKey :: (ContainerKey [(key, value)] -> MapValue [(key, value)] -> MapValue [(key, value)]) -> ContainerKey [(key, value)] -> [(key, value)] -> [(key, value)] #

updateMap :: (MapValue [(key, value)] -> Maybe (MapValue [(key, value)])) -> ContainerKey [(key, value)] -> [(key, value)] -> [(key, value)] #

updateWithKey :: (ContainerKey [(key, value)] -> MapValue [(key, value)] -> Maybe (MapValue [(key, value)])) -> ContainerKey [(key, value)] -> [(key, value)] -> [(key, value)] #

updateLookupWithKey :: (ContainerKey [(key, value)] -> MapValue [(key, value)] -> Maybe (MapValue [(key, value)])) -> ContainerKey [(key, value)] -> [(key, value)] -> (Maybe (MapValue [(key, value)]), [(key, value)]) #

alterMap :: (Maybe (MapValue [(key, value)]) -> Maybe (MapValue [(key, value)])) -> ContainerKey [(key, value)] -> [(key, value)] -> [(key, value)] #

unionWith :: (MapValue [(key, value)] -> MapValue [(key, value)] -> MapValue [(key, value)]) -> [(key, value)] -> [(key, value)] -> [(key, value)] #

unionWithKey :: (ContainerKey [(key, value)] -> MapValue [(key, value)] -> MapValue [(key, value)] -> MapValue [(key, value)]) -> [(key, value)] -> [(key, value)] -> [(key, value)] #

unionsWith :: (MapValue [(key, value)] -> MapValue [(key, value)] -> MapValue [(key, value)]) -> [[(key, value)]] -> [(key, value)] #

mapWithKey :: (ContainerKey [(key, value)] -> MapValue [(key, value)] -> MapValue [(key, value)]) -> [(key, value)] -> [(key, value)] #

omapKeysWith :: (MapValue [(key, value)] -> MapValue [(key, value)] -> MapValue [(key, value)]) -> (ContainerKey [(key, value)] -> ContainerKey [(key, value)]) -> [(key, value)] -> [(key, value)] #

filterMap :: (MapValue [(key, value)] -> Bool) -> [(key, value)] -> [(key, value)] #

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 #

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

type family MapValue map #

In some cases, MapValue and Element will be different, e.g., the IsMap instance of associated lists.

Instances

Instances details
type MapValue (IntMap value) 
Instance details

Defined in Data.Containers

type MapValue (IntMap value) = value
type MapValue [(key, value)] 
Instance details

Defined in Data.Containers

type MapValue [(key, value)] = value
type MapValue (Map key value) 
Instance details

Defined in Data.Containers

type MapValue (Map key value) = value
type MapValue (HashMap key value) 
Instance details

Defined in Data.Containers

type MapValue (HashMap key value) = value

class BiPolyMap (map :: Type -> Type -> Type) where #

A Map type polymorphic in both its key and value.

Associated Types

type BPMKeyConstraint (map :: Type -> Type -> Type) key #

Methods

mapKeysWith #

Arguments

:: (BPMKeyConstraint map k1, BPMKeyConstraint map k2) 
=> (v -> v -> v)

combine values that now overlap

-> (k1 -> k2) 
-> map k1 v 
-> map k2 v 

Instances

Instances details
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 #

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 #

type family BPMKeyConstraint (map :: Type -> Type -> Type) key #

Instances

Instances details
type BPMKeyConstraint Map key 
Instance details

Defined in Data.Containers

type BPMKeyConstraint Map key = Ord key
type BPMKeyConstraint HashMap key 
Instance details

Defined in Data.Containers

type BPMKeyConstraint HashMap key = (Hashable key, Eq key)

class PolyMap (map :: Type -> Type) where #

A guaranteed-polymorphic Map, which allows for more polymorphic versions of functions.

Methods

differenceMap :: map value1 -> map value2 -> map value1 #

Get the difference between two maps, using the left map's values.

intersectionMap :: map value1 -> map value2 -> map value1 #

Get the intersection of two maps, using the left map's values.

intersectionWithMap :: (value1 -> value2 -> value3) -> map value1 -> map value2 -> map value3 #

Get the intersection of two maps with a supplied function that takes in the left map's value and the right map's value.

Instances

Instances details
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 #

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 #

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

class (Monoid set, Semigroup set, MonoFoldable set, Eq (ContainerKey set), GrowingAppend set) => SetContainer set where #

A container whose values are stored in Key-Value pairs.

Minimal complete definition

member, notMember, union, difference, intersection, keys

Associated Types

type ContainerKey set #

The type of the key

Methods

member :: ContainerKey set -> set -> Bool #

Check if there is a value with the supplied key in the container.

notMember :: ContainerKey set -> set -> Bool #

Check if there isn't a value with the supplied key in the container.

union :: set -> set -> set #

Get the union of two containers.

unions :: (MonoFoldable mono, Element mono ~ set) => mono -> set #

Combine a collection of SetContainers, with left-most values overriding when there are matching keys.

Since: mono-traversable-1.0.0

difference :: set -> set -> set #

Get the difference of two containers.

intersection :: set -> set -> set #

Get the intersection of two containers.

keys :: set -> [ContainerKey set] #

Get a list of all of the keys in the container.

Instances

Instances details
SetContainer IntSet 
Instance details

Defined in Data.Containers

Associated Types

type ContainerKey IntSet #

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

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

(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 key => SetContainer [(key, value)] 
Instance details

Defined in Data.Containers

Associated Types

type ContainerKey [(key, value)] #

Methods

member :: ContainerKey [(key, value)] -> [(key, value)] -> Bool #

notMember :: ContainerKey [(key, value)] -> [(key, value)] -> Bool #

union :: [(key, value)] -> [(key, value)] -> [(key, value)] #

unions :: (MonoFoldable mono, Element mono ~ [(key, value)]) => mono -> [(key, value)] #

difference :: [(key, value)] -> [(key, value)] -> [(key, value)] #

intersection :: [(key, value)] -> [(key, value)] -> [(key, value)] #

keys :: [(key, value)] -> [ContainerKey [(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)] #

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

type family ContainerKey set #

The type of the key

Instances

Instances details
type ContainerKey IntSet 
Instance details

Defined in Data.Containers

type ContainerKey (IntMap value) 
Instance details

Defined in Data.Containers

type ContainerKey (IntMap value) = Int
type ContainerKey (Set element) 
Instance details

Defined in Data.Containers

type ContainerKey (Set element) = element
type ContainerKey (HashSet element) 
Instance details

Defined in Data.Containers

type ContainerKey (HashSet element) = element
type ContainerKey [(key, value)] 
Instance details

Defined in Data.Containers

type ContainerKey [(key, value)] = key
type ContainerKey (Map k v) 
Instance details

Defined in Data.Containers

type ContainerKey (Map k v) = k
type ContainerKey (HashMap key value) 
Instance details

Defined in Data.Containers

type ContainerKey (HashMap key value) = key

foldMap :: (MonoFoldable mono, Monoid m) => (Element mono -> m) -> mono -> m #

Synonym for ofoldMap

Since: mono-traversable-1.0.0

foldr :: MonoFoldable mono => (Element mono -> b -> b) -> b -> mono -> b #

Synonym for ofoldr

Since: mono-traversable-1.0.0

foldl' :: MonoFoldable mono => (a -> Element mono -> a) -> a -> mono -> a #

Synonym for ofoldl'

Since: mono-traversable-1.0.0

toList :: MonoFoldable mono => mono -> [Element mono] #

Synonym for otoList

Since: mono-traversable-1.0.0

all :: MonoFoldable mono => (Element mono -> Bool) -> mono -> Bool #

Synonym for oall

Since: mono-traversable-1.0.0

any :: MonoFoldable mono => (Element mono -> Bool) -> mono -> Bool #

Synonym for oany

Since: mono-traversable-1.0.0

null :: MonoFoldable mono => mono -> Bool #

Synonym for onull

Since: mono-traversable-1.0.0

length :: MonoFoldable mono => mono -> Int #

Synonym for olength

Since: mono-traversable-1.0.0

length64 :: MonoFoldable mono => mono -> Int64 #

Synonym for olength64

Since: mono-traversable-1.0.0

compareLength :: (MonoFoldable mono, Integral i) => mono -> i -> Ordering #

Synonym for ocompareLength

Since: mono-traversable-1.0.0

traverse_ :: (MonoFoldable mono, Applicative f) => (Element mono -> f b) -> mono -> f () #

Synonym for otraverse_

Since: mono-traversable-1.0.0

for_ :: (MonoFoldable mono, Applicative f) => mono -> (Element mono -> f b) -> f () #

Synonym for ofor_

Since: mono-traversable-1.0.0

mapM_ :: (MonoFoldable mono, Applicative m) => (Element mono -> m ()) -> mono -> m () #

Synonym for omapM_

Since: mono-traversable-1.0.0

forM_ :: (MonoFoldable mono, Applicative m) => mono -> (Element mono -> m ()) -> m () #

Synonym for oforM_

Since: mono-traversable-1.0.0

foldlM :: (MonoFoldable mono, Monad m) => (a -> Element mono -> m a) -> a -> mono -> m a #

Synonym for ofoldlM

Since: mono-traversable-1.0.0

foldMap1Ex :: (MonoFoldable mono, Semigroup m) => (Element mono -> m) -> mono -> m #

Synonym for ofoldMap1Ex

Since: mono-traversable-1.0.0

foldr1Ex :: MonoFoldable mono => (Element mono -> Element mono -> Element mono) -> mono -> Element mono #

Synonym for ofoldr1Ex

Since: mono-traversable-1.0.0

foldl1Ex' :: MonoFoldable mono => (Element mono -> Element mono -> Element mono) -> mono -> Element mono #

Synonym for ofoldl1Ex'

Since: mono-traversable-1.0.0

sum :: (MonoFoldable mono, Num (Element mono)) => mono -> Element mono #

Synonym for osum

Since: mono-traversable-1.0.0

product :: (MonoFoldable mono, Num (Element mono)) => mono -> Element mono #

Synonym for oproduct

Since: mono-traversable-1.0.0

and :: (MonoFoldable mono, Element mono ~ Bool) => mono -> Bool #

Synonym for oand

Since: mono-traversable-1.0.0

or :: (MonoFoldable mono, Element mono ~ Bool) => mono -> Bool #

Synonym for oor

Since: mono-traversable-1.0.0

concatMap :: (MonoFoldable mono, Monoid m) => (Element mono -> m) -> mono -> m #

Synonym for oconcatMap

Since: mono-traversable-1.0.0

elem :: (MonoFoldable mono, Eq (Element mono)) => Element mono -> mono -> Bool #

Synonym for oelem

Since: mono-traversable-1.0.0

notElem :: (MonoFoldable mono, Eq (Element mono)) => Element mono -> mono -> Bool #

Synonym for onotElem

Since: mono-traversable-1.0.0

point :: MonoPointed mono => Element mono -> mono #

Synonym for opoint

Since: mono-traversable-1.0.0

intercalate :: (MonoFoldable mono, Monoid (Element mono)) => Element mono -> mono -> Element mono #

Synonym for ointercalate

Since: mono-traversable-1.0.0

fold :: (MonoFoldable mono, Monoid (Element mono)) => mono -> Element mono #

Synonym for ofold

Since: mono-traversable-1.0.0

concat :: (MonoFoldable mono, Monoid (Element mono)) => mono -> Element mono #

Synonym for oconcat

Since: mono-traversable-1.0.0

foldM :: (MonoFoldable mono, Monad m) => (a -> Element mono -> m a) -> a -> mono -> m a #

Synonym for ofoldM

Since: mono-traversable-1.0.0

sequence_ :: (Applicative m, MonoFoldable mono, Element mono ~ m ()) => mono -> m () #

Synonym for osequence_

Since: mono-traversable-1.0.0

class (Textual textual, IsSequence binary) => Utf8 textual binary | textual -> binary, binary -> textual where #

Textual data which can be encoded to and decoded from UTF8.

Since: mono-traversable-1.0.0

Methods

encodeUtf8 :: textual -> binary #

Encode from textual to binary using UTF-8 encoding

Since: mono-traversable-1.0.0

decodeUtf8 :: binary -> textual #

Note that this function is required to be pure. In the case of a decoding error, Unicode replacement characters must be used.

Since: mono-traversable-1.0.0

Instances

Instances details
Utf8 Text ByteString 
Instance details

Defined in Data.Sequences

Utf8 Text ByteString 
Instance details

Defined in Data.Sequences

(c ~ Char, w ~ Word8) => Utf8 [c] [w] 
Instance details

Defined in Data.Sequences

Methods

encodeUtf8 :: [c] -> [w] #

decodeUtf8 :: [w] -> [c] #

class (IsSequence lazy, IsSequence strict) => LazySequence lazy strict | lazy -> strict, strict -> lazy where #

Lazy sequences containing strict chunks of data.

Since: mono-traversable-1.0.0

Methods

toChunks :: lazy -> [strict] #

fromChunks :: [strict] -> lazy #

toStrict :: lazy -> strict #

fromStrict :: strict -> lazy #

class (IsSequence t, IsString t, Element t ~ Char) => Textual t where #

A typeclass for sequences whose elements are Chars.

Minimal complete definition

words, unwords, lines, unlines, toLower, toUpper, toCaseFold

Methods

words :: t -> [t] #

Break up a textual sequence into a list of words, which were delimited by white space.

> words "abc  def ghi"
["abc","def","ghi"]

unwords :: (Element seq ~ t, MonoFoldable seq) => seq -> t #

Join a list of textual sequences using seperating spaces.

> unwords ["abc","def","ghi"]
"abc def ghi"

lines :: t -> [t] #

Break up a textual sequence at newline characters.

> lines "hello\nworld"
["hello","world"]

unlines :: (Element seq ~ t, MonoFoldable seq) => seq -> t #

Join a list of textual sequences using newlines.

> unlines ["abc","def","ghi"]
"abc\ndef\nghi"

toLower :: t -> t #

Convert a textual sequence to lower-case.

> toLower "HELLO WORLD"
"hello world"

toUpper :: t -> t #

Convert a textual sequence to upper-case.

> toUpper "hello world"
"HELLO WORLD"

toCaseFold :: t -> t #

Convert a textual sequence to folded-case.

Slightly different from toLower, see Data.Text.toCaseFold

breakWord :: t -> (t, t) #

Split a textual sequence into two parts, split at the first space.

> breakWord "hello world"
("hello","world")

breakLine :: t -> (t, t) #

Split a textual sequence into two parts, split at the newline.

> breakLine "abc\ndef"
("abc","def")

Instances

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

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

c ~ Char => Textual [c] 
Instance details

Defined in Data.Sequences

Methods

words :: [c] -> [[c]] #

unwords :: (Element seq ~ [c], MonoFoldable seq) => seq -> [c] #

lines :: [c] -> [[c]] #

unlines :: (Element seq ~ [c], MonoFoldable seq) => seq -> [c] #

toLower :: [c] -> [c] #

toUpper :: [c] -> [c] #

toCaseFold :: [c] -> [c] #

breakWord :: [c] -> ([c], [c]) #

breakLine :: [c] -> ([c], [c]) #

class (Monoid seq, MonoTraversable seq, SemiSequence seq, MonoPointed seq) => IsSequence seq where #

Sequence Laws:

fromList . otoList = id
fromList (x <> y) = fromList x <> fromList y
otoList (fromList x <> fromList y) = x <> y

Minimal complete definition

Nothing

Methods

fromList :: [Element seq] -> seq #

Convert a list to a sequence.

> fromList [a, b, c] :: Text
"abc"

lengthIndex :: seq -> Index seq #

lengthIndex returns the length of a sequence as Index seq.

Since: mono-traversable-1.0.2

break :: (Element seq -> Bool) -> seq -> (seq, seq) #

break applies a predicate to a sequence, and returns a tuple where the first element is the longest prefix (possibly empty) of elements that do not satisfy the predicate. The second element of the tuple is the remainder of the sequence.

break p is equivalent to span (not . p)

> break (> 3) (fromList [1,2,3,4,1,2,3,4] :: Vector Int)
(fromList [1,2,3],fromList [4,1,2,3,4])

> break (< z) (fromList "abc" :: Text)
("","abc")

> break (> z) (fromList "abc" :: Text)
("abc","")

span :: (Element seq -> Bool) -> seq -> (seq, seq) #

span applies a predicate to a sequence, and returns a tuple where the first element is the longest prefix (possibly empty) that does satisfy the predicate. The second element of the tuple is the remainder of the sequence.

span p xs is equivalent to (takeWhile p xs, dropWhile p xs)

> span (< 3) (fromList [1,2,3,4,1,2,3,4] :: Vector Int)
(fromList [1,2],fromList [3,4,1,2,3,4])

> span (< z) (fromList "abc" :: Text)
("abc","")

> span (< 0) 1,2,3

dropWhile :: (Element seq -> Bool) -> seq -> seq #

dropWhile returns the suffix remaining after takeWhile.

> dropWhile (< 3) [1,2,3,4,5,1,2,3]
[3,4,5,1,2,3]

> dropWhile (< z) (fromList "abc" :: Text)
""

takeWhile :: (Element seq -> Bool) -> seq -> seq #

takeWhile applies a predicate to a sequence, and returns the longest prefix (possibly empty) of the sequence of elements that satisfy the predicate.

> takeWhile (< 3) [1,2,3,4,5,1,2,3]
[1,2]

> takeWhile (< z) (fromList "abc" :: Text)
"abc"

splitAt :: Index seq -> seq -> (seq, seq) #

splitAt n se returns a tuple where the first element is the prefix of the sequence se with length n, and the second element is the remainder of the sequence.

> splitAt 6 "Hello world!"
("Hello ","world!")

> splitAt 3 (fromList [1,2,3,4,5] :: Vector Int)
(fromList [1,2,3],fromList [4,5])

unsafeSplitAt :: Index seq -> seq -> (seq, seq) #

Equivalent to splitAt.

take :: Index seq -> seq -> seq #

take n returns the prefix of a sequence of length n, or the sequence itself if n > olength seq.

> take 3 "abcdefg"
"abc"
> take 4 (fromList [1,2,3,4,5,6] :: Vector Int)
fromList [1,2,3,4]

unsafeTake :: Index seq -> seq -> seq #

Equivalent to take.

drop :: Index seq -> seq -> seq #

drop n returns the suffix of a sequence after the first n elements, or an empty sequence if n > olength seq.

> drop 3 "abcdefg"
"defg"
> drop 4 (fromList [1,2,3,4,5,6] :: Vector Int)
fromList [5,6]

unsafeDrop :: Index seq -> seq -> seq #

Equivalent to drop

dropEnd :: Index seq -> seq -> seq #

Same as drop but drops from the end of the sequence instead.

> dropEnd 3 "abcdefg"
"abcd"
> dropEnd 4 (fromList [1,2,3,4,5,6] :: Vector Int)
fromList [1,2]

Since: mono-traversable-1.0.4.0

partition :: (Element seq -> Bool) -> seq -> (seq, seq) #

partition takes a predicate and a sequence and returns the pair of sequences of elements which do and do not satisfy the predicate.

partition p se = (filter p se, filter (not . p) se)

uncons :: seq -> Maybe (Element seq, seq) #

uncons returns the tuple of the first element of a sequence and the rest of the sequence, or Nothing if the sequence is empty.

> uncons (fromList [1,2,3,4] :: Vector Int)
Just (1,fromList [2,3,4])

> uncons ([] :: [Int])
Nothing

unsnoc :: seq -> Maybe (seq, Element seq) #

unsnoc returns the tuple of the init of a sequence and the last element, or Nothing if the sequence is empty.

> unsnoc (fromList [1,2,3,4] :: Vector Int)
Just (fromList [1,2,3],4)

> unsnoc ([] :: [Int])
Nothing

filter :: (Element seq -> Bool) -> seq -> seq #

filter given a predicate returns a sequence of all elements that satisfy the predicate.

> filter (< 5) [1 .. 10]
[1,2,3,4]

filterM :: Monad m => (Element seq -> m Bool) -> seq -> m seq #

The monadic version of filter.

replicate :: Index seq -> Element seq -> seq #

replicate n x is a sequence of length n with x as the value of every element.

> replicate 10 a :: Text
"aaaaaaaaaa"

replicateM :: Monad m => Index seq -> m (Element seq) -> m seq #

The monadic version of replicateM.

groupBy :: (Element seq -> Element seq -> Bool) -> seq -> [seq] #

group takes a sequence and returns a list of sequences such that the concatenation of the result is equal to the argument. Each subsequence in the result contains only equal elements, using the supplied equality test.

> groupBy (==) Mississippi
[M,"i","ss","i","ss","i","pp","i"]

groupAllOn :: Eq b => (Element seq -> b) -> seq -> [seq] #

Similar to standard groupBy, but operates on the whole collection, not just the consecutive items.

subsequences :: seq -> [seq] #

subsequences returns a list of all subsequences of the argument.

> subsequences "abc"
["","a","b","ab","c","ac","bc","abc"]

permutations :: seq -> [seq] #

permutations returns a list of all permutations of the argument.

> permutations "abc"
["abc","bac","cba","bca","cab","acb"]

tailEx :: seq -> seq #

Unsafe

Get the tail of a sequence, throw an exception if the sequence is empty.

> tailEx [1,2,3]
[2,3]

tailMay :: seq -> Maybe seq #

Safe version of tailEx.

Returns Nothing instead of throwing an exception when encountering an empty monomorphic container.

Since: mono-traversable-1.0.0

initEx :: seq -> seq #

Unsafe

Get the init of a sequence, throw an exception if the sequence is empty.

> initEx [1,2,3]
[1,2]

initMay :: seq -> Maybe seq #

Safe version of initEx.

Returns Nothing instead of throwing an exception when encountering an empty monomorphic container.

Since: mono-traversable-1.0.0

unsafeTail :: seq -> seq #

Equivalent to tailEx.

unsafeInit :: seq -> seq #

Equivalent to initEx.

index :: seq -> Index seq -> Maybe (Element seq) #

Get the element of a sequence at a certain index, returns Nothing if that index does not exist.

> index (fromList [1,2,3] :: Vector Int) 1
Just 2
> index (fromList [1,2,3] :: Vector Int) 4
Nothing

indexEx :: seq -> Index seq -> Element seq #

Unsafe

Get the element of a sequence at a certain index, throws an exception if the index does not exist.

unsafeIndex :: seq -> Index seq -> Element seq #

Equivalent to indexEx.

splitWhen :: (Element seq -> Bool) -> seq -> [seq] #

splitWhen splits a sequence into components delimited by separators, where the predicate returns True for a separator element. The resulting components do not contain the separators. Two adjacent separators result in an empty component in the output. The number of resulting components is greater by one than number of separators.

Since 0.9.3

Instances

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

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

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

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

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

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

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

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

IsSequence [a] 
Instance details

Defined in Data.Sequences

Methods

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

lengthIndex :: [a] -> Index [a] #

break :: (Element [a] -> Bool) -> [a] -> ([a], [a]) #

span :: (Element [a] -> Bool) -> [a] -> ([a], [a]) #

dropWhile :: (Element [a] -> Bool) -> [a] -> [a] #

takeWhile :: (Element [a] -> Bool) -> [a] -> [a] #

splitAt :: Index [a] -> [a] -> ([a], [a]) #

unsafeSplitAt :: Index [a] -> [a] -> ([a], [a]) #

take :: Index [a] -> [a] -> [a] #

unsafeTake :: Index [a] -> [a] -> [a] #

drop :: Index [a] -> [a] -> [a] #

unsafeDrop :: Index [a] -> [a] -> [a] #

dropEnd :: Index [a] -> [a] -> [a] #

partition :: (Element [a] -> Bool) -> [a] -> ([a], [a]) #

uncons :: [a] -> Maybe (Element [a], [a]) #

unsnoc :: [a] -> Maybe ([a], Element [a]) #

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

filterM :: Monad m => (Element [a] -> m Bool) -> [a] -> m [a] #

replicate :: Index [a] -> Element [a] -> [a] #

replicateM :: Monad m => Index [a] -> m (Element [a]) -> m [a] #

groupBy :: (Element [a] -> Element [a] -> Bool) -> [a] -> [[a]] #

groupAllOn :: Eq b => (Element [a] -> b) -> [a] -> [[a]] #

subsequences :: [a] -> [[a]] #

permutations :: [a] -> [[a]] #

tailEx :: [a] -> [a] #

tailMay :: [a] -> Maybe [a] #

initEx :: [a] -> [a] #

initMay :: [a] -> Maybe [a] #

unsafeTail :: [a] -> [a] #

unsafeInit :: [a] -> [a] #

index :: [a] -> Index [a] -> Maybe (Element [a]) #

indexEx :: [a] -> Index [a] -> Element [a] #

unsafeIndex :: [a] -> Index [a] -> Element [a] #

splitWhen :: (Element [a] -> Bool) -> [a] -> [[a]] #

class (Integral (Index seq), GrowingAppend seq) => SemiSequence seq where #

SemiSequence was created to share code between IsSequence and NonNull.

Semi means SemiGroup A SemiSequence can accomodate a SemiGroup such as NonEmpty or NonNull A Monoid should be able to fill out IsSequence.

SemiSequence operations maintain the same type because they all maintain the same number of elements or increase them. However, a decreasing function such as filter may change they type. For example, from NonEmpty to '[]' This type-changing function exists on NonNull as nfilter

filter and other such functions are placed in IsSequence

NOTE: Like GrowingAppend, ideally we'd have a Semigroup superclass constraint here, but that would pull in more dependencies to this package than desired.

Associated Types

type Index seq #

The type of the index of a sequence.

Methods

intersperse :: Element seq -> seq -> seq #

intersperse takes an element and intersperses that element between the elements of the sequence.

> intersperse ',' "abcde"
"a,b,c,d,e"

reverse :: seq -> seq #

Reverse a sequence

> reverse "hello world"
"dlrow olleh"

find :: (Element seq -> Bool) -> seq -> Maybe (Element seq) #

find takes a predicate and a sequence and returns the first element in the sequence matching the predicate, or Nothing if there isn't an element that matches the predicate.

> find (== 5) [1 .. 10]
Just 5

> find (== 15) [1 .. 10]
Nothing

sortBy :: (Element seq -> Element seq -> Ordering) -> seq -> seq #

Sort a sequence using an supplied element ordering function.

> let compare' x y = case compare x y of LT -> GT; EQ -> EQ; GT -> LT
> sortBy compare' [5,3,6,1,2,4]
[6,5,4,3,2,1]

cons :: Element seq -> seq -> seq #

Prepend an element onto a sequence.

> 4 `cons` [1,2,3]
[4,1,2,3]

snoc :: seq -> Element seq -> seq #

Append an element onto a sequence.

> [1,2,3] `snoc` 4
[1,2,3,4]

Instances

Instances details
SemiSequence ByteString 
Instance details

Defined in Data.Sequences

Associated Types

type Index ByteString #

SemiSequence ByteString 
Instance details

Defined in Data.Sequences

Associated Types

type Index ByteString #

SemiSequence Text 
Instance details

Defined in Data.Sequences

Associated Types

type Index Text #

SemiSequence Text 
Instance details

Defined in Data.Sequences

Associated Types

type Index Text #

SemiSequence (NonEmpty a) 
Instance details

Defined in Data.Sequences

Associated Types

type Index (NonEmpty 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 #

SemiSequence seq => SemiSequence (NonNull seq) 
Instance details

Defined in Data.NonNull

Associated Types

type Index (NonNull seq) #

Methods

intersperse :: Element (NonNull seq) -> NonNull seq -> NonNull seq #

reverse :: NonNull seq -> NonNull seq #

find :: (Element (NonNull seq) -> Bool) -> NonNull seq -> Maybe (Element (NonNull seq)) #

sortBy :: (Element (NonNull seq) -> Element (NonNull seq) -> Ordering) -> NonNull seq -> NonNull seq #

cons :: Element (NonNull seq) -> NonNull seq -> NonNull seq #

snoc :: NonNull seq -> Element (NonNull seq) -> NonNull seq #

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 #

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

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

SemiSequence [a] 
Instance details

Defined in Data.Sequences

Associated Types

type Index [a] #

Methods

intersperse :: Element [a] -> [a] -> [a] #

reverse :: [a] -> [a] #

find :: (Element [a] -> Bool) -> [a] -> Maybe (Element [a]) #

sortBy :: (Element [a] -> Element [a] -> Ordering) -> [a] -> [a] #

cons :: Element [a] -> [a] -> [a] #

snoc :: [a] -> Element [a] -> [a] #

type family Index seq #

The type of the index of a sequence.

Instances

Instances details
type Index ByteString 
Instance details

Defined in Data.Sequences

type Index ByteString 
Instance details

Defined in Data.Sequences

type Index Text 
Instance details

Defined in Data.Sequences

type Index Text = Int
type Index Text 
Instance details

Defined in Data.Sequences

type Index (NonEmpty a) 
Instance details

Defined in Data.Sequences

type Index (NonEmpty a) = Int
type Index (Seq a) 
Instance details

Defined in Data.Sequences

type Index (Seq a) = Int
type Index (DList a) 
Instance details

Defined in Data.MonoTraversable.Instances

type Index (DList a) = Int
type Index (NonNull seq) 
Instance details

Defined in Data.NonNull

type Index (NonNull seq) = Index seq
type Index (Vector a) 
Instance details

Defined in Data.Sequences

type Index (Vector a) = Int
type Index (Vector a) 
Instance details

Defined in Data.Sequences

type Index (Vector a) = Int
type Index (Vector a) 
Instance details

Defined in Data.Sequences

type Index (Vector a) = Int
type Index [a] 
Instance details

Defined in Data.Sequences

type Index [a] = Int

singleton :: MonoPointed seq => Element seq -> seq #

Create a sequence from a single element.

> singleton a :: String
"a"
> singleton a :: Vector Char
fromList "a"

defaultFind :: MonoFoldable seq => (Element seq -> Bool) -> seq -> Maybe (Element seq) #

Use Data.List's implementation of find.

defaultIntersperse :: IsSequence seq => Element seq -> seq -> seq #

Use Data.List's implementation of intersperse.

defaultReverse :: IsSequence seq => seq -> seq #

Use Data.List's implementation of reverse.

defaultSortBy :: IsSequence seq => (Element seq -> Element seq -> Ordering) -> seq -> seq #

Use Data.List's implementation of sortBy.

defaultSplitWhen :: IsSequence seq => (Element seq -> Bool) -> seq -> [seq] #

vectorSortBy :: Vector v e => (e -> e -> Ordering) -> v e -> v e #

Sort a vector using an supplied element ordering function.

vectorSort :: (Vector v e, Ord e) => v e -> v e #

Sort a vector.

defaultCons :: IsSequence seq => Element seq -> seq -> seq #

Use Data.List's : to prepend an element to a sequence.

defaultSnoc :: IsSequence seq => seq -> Element seq -> seq #

Use Data.List's ++ to append an element to a sequence.

tailDef :: IsSequence seq => seq -> seq #

like Data.List.tail, but an input of mempty returns mempty

initDef :: IsSequence seq => seq -> seq #

like Data.List.init, but an input of mempty returns mempty

splitElem :: (IsSequence seq, Eq (Element seq)) => Element seq -> seq -> [seq] #

splitElem splits a sequence into components delimited by separator element. It's equivalent to splitWhen with equality predicate:

splitElem sep === splitWhen (== sep)

Since 0.9.3

splitSeq :: (IsSequence seq, Eq (Element seq)) => seq -> seq -> [seq] #

splitSeq splits a sequence into components delimited by separator subsequence. splitSeq is the right inverse of intercalate:

ointercalate x . splitSeq x === id

splitElem can be considered a special case of splitSeq

splitSeq (singleton sep) === splitElem sep

splitSeq mempty is another special case: it splits just before each element, and in line with splitWhen rules, it has at least one output component:

> splitSeq "" ""
[""]
> splitSeq "" "a"
["", "a"]
> splitSeq "" "ab"
["", "a", "b"]

Since 0.9.3

replaceSeq :: (IsSequence seq, Eq (Element seq)) => seq -> seq -> seq -> seq #

replaceSeq old new replaces all old subsequences with new.

replaceSeq old new === ointercalate new . splitSeq old

Since: mono-traversable-1.0.1

stripPrefix :: (IsSequence seq, Eq (Element seq)) => seq -> seq -> Maybe seq #

stripPrefix drops the given prefix from a sequence. It returns Nothing if the sequence did not start with the prefix given, or Just the sequence after the prefix, if it does.

> stripPrefix "foo" "foobar"
Just "bar"
> stripPrefix "abc" "foobar"
Nothing

stripSuffix :: (IsSequence seq, Eq (Element seq)) => seq -> seq -> Maybe seq #

stripSuffix drops the given suffix from a sequence. It returns Nothing if the sequence did not end with the suffix given, or Just the sequence before the suffix, if it does.

> stripSuffix "bar" "foobar"
Just "foo"
> stripSuffix "abc" "foobar"
Nothing

dropPrefix :: (IsSequence seq, Eq (Element seq)) => seq -> seq -> seq #

dropPrefix drops the given prefix from a sequence. It returns the original sequence if the sequence doesn't start with the given prefix.

> dropPrefix "foo" "foobar"
"bar"
> dropPrefix "abc" "foobar"
"foobar"

Since: mono-traversable-1.0.7.0

dropSuffix :: (IsSequence seq, Eq (Element seq)) => seq -> seq -> seq #

dropSuffix drops the given suffix from a sequence. It returns the original sequence if the sequence doesn't end with the given suffix.

> dropSuffix "bar" "foobar"
"foo"
> dropSuffix "abc" "foobar"
"foobar"

Since: mono-traversable-1.0.7.0

ensurePrefix :: (Eq (Element seq), IsSequence seq) => seq -> seq -> seq #

ensurePrefix will add a prefix to a sequence if it doesn't exist, and otherwise have no effect.

> ensurePrefix "foo" "foobar"
"foobar"
> ensurePrefix "abc" "foobar"
"abcfoobar"

Since: mono-traversable-1.0.3

ensureSuffix :: (Eq (Element seq), IsSequence seq) => seq -> seq -> seq #

Append a suffix to a sequence, unless it already has that suffix.

> ensureSuffix "bar" "foobar"
"foobar"
> ensureSuffix "abc" "foobar"
"foobarabc"

Since: mono-traversable-1.0.3

isPrefixOf :: (IsSequence seq, Eq (Element seq)) => seq -> seq -> Bool #

isPrefixOf takes two sequences and returns True if the first sequence is a prefix of the second.

isSuffixOf :: (IsSequence seq, Eq (Element seq)) => seq -> seq -> Bool #

isSuffixOf takes two sequences and returns True if the first sequence is a suffix of the second.

isInfixOf :: (IsSequence seq, Eq (Element seq)) => seq -> seq -> Bool #

isInfixOf takes two sequences and returns true if the first sequence is contained, wholly and intact, anywhere within the second.

group :: (IsSequence seq, Eq (Element seq)) => seq -> [seq] #

Equivalent to groupBy (==)

groupAll :: (IsSequence seq, Eq (Element seq)) => seq -> [seq] #

Similar to standard group, but operates on the whole collection, not just the consecutive items.

Equivalent to groupAllOn id

sort :: (SemiSequence seq, Ord (Element seq)) => seq -> seq #

Sort a ordered sequence.

> sort [4,3,1,2]
[1,2,3,4]

catMaybes :: (IsSequence (f (Maybe t)), Functor f, Element (f (Maybe t)) ~ Maybe t) => f (Maybe t) -> f t #

Takes all of the Just values from a sequence of Maybe ts and concatenates them into an unboxed sequence of ts.

Since 0.6.2

sortOn :: (Ord o, SemiSequence seq) => (Element seq -> o) -> seq -> seq #

Same as sortBy . comparing.

Since 0.7.0

pack :: IsSequence seq => [Element seq] -> seq #

Synonym for fromList

Since: mono-traversable-1.0.0

unpack :: MonoFoldable mono => mono -> [Element mono] #

Synonym for otoList

Since: mono-traversable-1.0.0

repack :: (MonoFoldable a, IsSequence b, Element a ~ Element b) => a -> b #

Repack from one type to another, dropping to a list in the middle.

repack = pack . unpack.

Since: mono-traversable-1.0.0

data NonNull mono #

A monomorphic container that is not null.

Instances

Instances details
Data mono => Data (NonNull mono) 
Instance details

Defined in Data.NonNull

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NonNull mono -> c (NonNull mono) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (NonNull mono) #

toConstr :: NonNull mono -> Constr #

dataTypeOf :: NonNull mono -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (NonNull mono)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (NonNull mono)) #

gmapT :: (forall b. Data b => b -> b) -> NonNull mono -> NonNull mono #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NonNull mono -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NonNull mono -> r #

gmapQ :: (forall d. Data d => d -> u) -> NonNull mono -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> NonNull mono -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NonNull mono -> m (NonNull mono) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NonNull mono -> m (NonNull mono) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NonNull mono -> m (NonNull mono) #

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

Read mono => Read (NonNull mono) 
Instance details

Defined in Data.NonNull

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 #

Eq mono => Eq (NonNull mono) 
Instance details

Defined in Data.NonNull

Methods

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

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

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 #

GrowingAppend mono => GrowingAppend (NonNull mono) 
Instance details

Defined in Data.NonNull

IsSequence mono => MonoComonad (NonNull mono) 
Instance details

Defined in Data.NonNull

Methods

oextract :: NonNull mono -> Element (NonNull mono) #

oextend :: (NonNull mono -> Element (NonNull mono)) -> NonNull mono -> NonNull mono #

MonoFoldable mono => MonoFoldable (NonNull mono) 
Instance details

Defined in Data.NonNull

Methods

ofoldMap :: Monoid m => (Element (NonNull mono) -> m) -> NonNull mono -> m #

ofoldr :: (Element (NonNull mono) -> b -> b) -> b -> NonNull mono -> b #

ofoldl' :: (a -> Element (NonNull mono) -> a) -> a -> NonNull mono -> a #

otoList :: NonNull mono -> [Element (NonNull mono)] #

oall :: (Element (NonNull mono) -> Bool) -> NonNull mono -> Bool #

oany :: (Element (NonNull mono) -> Bool) -> NonNull mono -> Bool #

onull :: NonNull mono -> Bool #

olength :: NonNull mono -> Int #

olength64 :: NonNull mono -> Int64 #

ocompareLength :: Integral i => NonNull mono -> i -> Ordering #

otraverse_ :: Applicative f => (Element (NonNull mono) -> f b) -> NonNull mono -> f () #

ofor_ :: Applicative f => NonNull mono -> (Element (NonNull mono) -> f b) -> f () #

omapM_ :: Applicative m => (Element (NonNull mono) -> m ()) -> NonNull mono -> m () #

oforM_ :: Applicative m => NonNull mono -> (Element (NonNull mono) -> m ()) -> m () #

ofoldlM :: Monad m => (a -> Element (NonNull mono) -> m a) -> a -> NonNull mono -> m a #

ofoldMap1Ex :: Semigroup m => (Element (NonNull mono) -> m) -> NonNull mono -> m #

ofoldr1Ex :: (Element (NonNull mono) -> Element (NonNull mono) -> Element (NonNull mono)) -> NonNull mono -> Element (NonNull mono) #

ofoldl1Ex' :: (Element (NonNull mono) -> Element (NonNull mono) -> Element (NonNull mono)) -> NonNull mono -> Element (NonNull mono) #

headEx :: NonNull mono -> Element (NonNull mono) #

lastEx :: NonNull mono -> Element (NonNull mono) #

unsafeHead :: NonNull mono -> Element (NonNull mono) #

unsafeLast :: NonNull mono -> Element (NonNull mono) #

maximumByEx :: (Element (NonNull mono) -> Element (NonNull mono) -> Ordering) -> NonNull mono -> Element (NonNull mono) #

minimumByEx :: (Element (NonNull mono) -> Element (NonNull mono) -> Ordering) -> NonNull mono -> Element (NonNull mono) #

oelem :: Element (NonNull mono) -> NonNull mono -> Bool #

onotElem :: Element (NonNull mono) -> NonNull mono -> Bool #

MonoFunctor mono => MonoFunctor (NonNull mono) 
Instance details

Defined in Data.NonNull

Methods

omap :: (Element (NonNull mono) -> Element (NonNull mono)) -> NonNull mono -> NonNull mono #

MonoPointed mono => MonoPointed (NonNull mono) 
Instance details

Defined in Data.NonNull

Methods

opoint :: Element (NonNull mono) -> NonNull mono #

MonoTraversable mono => MonoTraversable (NonNull mono) 
Instance details

Defined in Data.NonNull

Methods

otraverse :: Applicative f => (Element (NonNull mono) -> f (Element (NonNull mono))) -> NonNull mono -> f (NonNull mono) #

omapM :: Applicative m => (Element (NonNull mono) -> m (Element (NonNull mono))) -> NonNull mono -> m (NonNull mono) #

SemiSequence seq => SemiSequence (NonNull seq) 
Instance details

Defined in Data.NonNull

Associated Types

type Index (NonNull seq) #

Methods

intersperse :: Element (NonNull seq) -> NonNull seq -> NonNull seq #

reverse :: NonNull seq -> NonNull seq #

find :: (Element (NonNull seq) -> Bool) -> NonNull seq -> Maybe (Element (NonNull seq)) #

sortBy :: (Element (NonNull seq) -> Element (NonNull seq) -> Ordering) -> NonNull seq -> NonNull seq #

cons :: Element (NonNull seq) -> NonNull seq -> NonNull seq #

snoc :: NonNull seq -> Element (NonNull seq) -> NonNull seq #

type Element (NonNull mono) 
Instance details

Defined in Data.NonNull

type Element (NonNull mono) = Element mono
type Index (NonNull seq) 
Instance details

Defined in Data.NonNull

type Index (NonNull seq) = Index seq

fromNullable :: MonoFoldable mono => mono -> Maybe (NonNull mono) #

Safely convert from an unsafe monomorphic container to a safe non-null monomorphic container.

impureNonNull :: MonoFoldable mono => mono -> NonNull mono #

Unsafely convert from an unsafe monomorphic container to a safe non-null monomorphic container.

Throws an exception if the monomorphic container is empty.

Since: mono-traversable-1.0.0

nonNull :: MonoFoldable mono => mono -> NonNull mono #

Old synonym for impureNonNull

fromNonEmpty :: IsSequence seq => NonEmpty (Element seq) -> NonNull seq #

Safely convert from a NonEmpty list to a non-null monomorphic container.

toNonEmpty :: MonoFoldable mono => NonNull mono -> NonEmpty (Element mono) #

Safely convert from a NonNull container to a NonEmpty list.

Since: mono-traversable-1.0.15.0

toMinList :: NonEmpty a -> NonNull [a] #

Specializes fromNonEmpty to lists only.

ncons :: SemiSequence seq => Element seq -> seq -> NonNull seq #

Prepend an element to a SemiSequence, creating a non-null SemiSequence.

Generally this uses cons underneath. cons is not efficient for most data structures.

Alternatives:

  • if you don't need to cons, use fromNullable or nonNull if you can create your structure in one go.
  • if you need to cons, you might be able to start off with an efficient data structure such as a NonEmpty List. fronNonEmpty will convert that to your data structure using the structure's fromList function.

nuncons :: IsSequence seq => NonNull seq -> (Element seq, Maybe (NonNull seq)) #

Extract the first element of a sequnce and the rest of the non-null sequence if it exists.

splitFirst :: IsSequence seq => NonNull seq -> (Element seq, seq) #

Same as nuncons with no guarantee that the rest of the sequence is non-null.

nfilter :: IsSequence seq => (Element seq -> Bool) -> NonNull seq -> seq #

Equivalent to Data.Sequences.filter, but works on non-nullable sequences.

nfilterM :: (Monad m, IsSequence seq) => (Element seq -> m Bool) -> NonNull seq -> m seq #

Equivalent to Data.Sequences.filterM, but works on non-nullable sequences.

nReplicate :: IsSequence seq => Index seq -> Element seq -> NonNull seq #

Equivalent to Data.Sequences.replicate

i must be > 0

i <= 0 is treated the same as providing 1

tail :: IsSequence seq => NonNull seq -> seq #

Safe version of tailEx, only working on non-nullable sequences.

init :: IsSequence seq => NonNull seq -> seq #

Safe version of initEx, only working on non-nullable sequences.

(<|) :: SemiSequence seq => Element seq -> NonNull seq -> NonNull seq infixr 5 #

Prepend an element to a non-null SemiSequence.

head :: MonoFoldable mono => NonNull mono -> Element mono #

Return the first element of a monomorphic container.

Safe version of headEx, only works on monomorphic containers wrapped in a NonNull.

last :: MonoFoldable mono => NonNull mono -> Element mono #

Return the last element of a monomorphic container.

Safe version of lastEx, only works on monomorphic containers wrapped in a NonNull.

ofoldMap1 :: (MonoFoldable mono, Semigroup m) => (Element mono -> m) -> NonNull mono -> m #

Map each element of a monomorphic container to a semigroup, and combine the results.

Safe version of ofoldMap1Ex, only works on monomorphic containers wrapped in a NonNull.

Examples

Expand
> let xs = ncons ("hello", 1 :: Integer) [(" world", 2)]
> ofoldMap1 fst xs
"hello world"

ofold1 :: (MonoFoldable mono, Semigroup (Element mono)) => NonNull mono -> Element mono #

Join a monomorphic container, whose elements are Semigroups, together.

Safe, only works on monomorphic containers wrapped in a NonNull.

Examples

Expand
> let xs = ncons "a" ["b", "c"]
> xs
NonNull {toNullable = ["a","b","c"]}

> ofold1 xs
"abc"

ofoldr1 :: MonoFoldable mono => (Element mono -> Element mono -> Element mono) -> NonNull mono -> Element mono #

Right-associative fold of a monomorphic container with no base element.

Safe version of ofoldr1Ex, only works on monomorphic containers wrapped in a NonNull.

foldr1 f = Prelude.foldr1 f . otoList

Examples

Expand
> let xs = ncons "a" ["b", "c"]
> ofoldr1 (++) xs
"abc"

ofoldl1' :: MonoFoldable mono => (Element mono -> Element mono -> Element mono) -> NonNull mono -> Element mono #

Strict left-associative fold of a monomorphic container with no base element.

Safe version of ofoldl1Ex', only works on monomorphic containers wrapped in a NonNull.

foldl1' f = Prelude.foldl1' f . otoList

Examples

Expand
> let xs = ncons "a" ["b", "c"]
> ofoldl1' (++) xs
"abc"

maximum :: (MonoFoldable mono, Ord (Element mono)) => NonNull mono -> Element mono #

Get the maximum element of a monomorphic container.

Safe version of maximumEx, only works on monomorphic containers wrapped in a NonNull.

Examples

Expand
> let xs = ncons 1 [2, 3 :: Int]
> maximum xs
3

minimum :: (MonoFoldable mono, Ord (Element mono)) => NonNull mono -> Element mono #

Get the minimum element of a monomorphic container.

Safe version of minimumEx, only works on monomorphic containers wrapped in a NonNull.

Examples

Expand
> let xs = ncons 1 [2, 3 :: Int]
> minimum xs
1

maximumBy :: MonoFoldable mono => (Element mono -> Element mono -> Ordering) -> NonNull mono -> Element mono #

Get the maximum element of a monomorphic container, using a supplied element ordering function.

Safe version of maximumByEx, only works on monomorphic containers wrapped in a NonNull.

minimumBy :: MonoFoldable mono => (Element mono -> Element mono -> Ordering) -> NonNull mono -> Element mono #

Get the minimum element of a monomorphic container, using a supplied element ordering function.

Safe version of minimumByEx, only works on monomorphic containers wrapped in a NonNull.

mapNonNull :: (Functor f, MonoFoldable (f b)) => (a -> b) -> NonNull (f a) -> NonNull (f b) #

fmap over the underlying container in a NonNull.

Since: mono-traversable-1.0.6.0

interact :: MonadIO m => (LText -> LText) -> m () #

Takes a function of type 'LText -> LText' and passes all input on stdin to it, then prints result to stdout

Uses lazy IO Uses system locale settings

Since: classy-prelude-1.3.1

getContents :: MonadIO m => m LText #

Read all input from stdin into a lazy Text (LText)

Uses system locale settings

Since: classy-prelude-1.3.1

getLine :: MonadIO m => m Text #

Read a line from stdin

Uses system locale settings

Since: classy-prelude-1.3.1

getChar :: MonadIO m => m Char #

Read a character from stdin

Uses system locale settings

Since: classy-prelude-1.3.1

putStrLn :: MonadIO m => Text -> m () #

Write a Text followed by a newline to stdout

Uses system locale settings

Since: classy-prelude-1.3.1

putStr :: MonadIO m => Text -> m () #

Write a Text to stdout

Uses system locale settings

Since: classy-prelude-1.3.1

putChar :: MonadIO m => Char -> m () #

Write a character to stdout

Uses system locale settings

Since: classy-prelude-1.3.1

hGetChunk :: MonadIO m => Handle -> m ByteString #

Read a single chunk of data as a ByteString from the given Handle.

Under the surface, this uses hGetSome with the default chunk size.

Since: classy-prelude-1.2.0

hPut :: MonadIO m => Handle -> ByteString -> m () #

Write a ByteString to the given Handle.

Since: classy-prelude-1.2.0

hGetContents :: MonadIO m => Handle -> m ByteString #

Strictly read the contents of the given Handle into a ByteString.

Since: classy-prelude-1.2.0

writeFileUtf8 :: MonadIO m => FilePath -> Text -> m () #

Write a Text to a file using a UTF-8 character encoding.

Since: classy-prelude-1.2.0

writeFile :: MonadIO m => FilePath -> ByteString -> m () #

Write a ByteString to a file.

Since: classy-prelude-1.2.0

readFileUtf8 :: MonadIO m => FilePath -> m Text #

Strictly read a file into a Text using a UTF-8 character encoding. In the event of a character encoding error, a Unicode replacement character will be used (a.k.a., lenientDecode).

Since: classy-prelude-1.2.0

readFile :: MonadIO m => FilePath -> m ByteString #

Strictly read a file into a ByteString.

Since: classy-prelude-1.2.0

link2Async :: MonadIO m => Async a -> Async b -> m () #

link2 generalized to any MonadIO

Since: classy-prelude-1.0.0

linkAsync :: MonadIO m => Async a -> m () #

link generalized to any MonadIO

Since: classy-prelude-1.0.0

waitCatchAsync :: MonadIO m => Async a -> m (Either SomeException a) #

waitCatchSTM for any MonadIO

Since: classy-prelude-1.0.0

pollAsync :: MonadIO m => Async a -> m (Maybe (Either SomeException a)) #

pollSTM for any MonadIO

Since: classy-prelude-1.0.0

waitAsync :: MonadIO m => Async a -> m a #

waitSTM for any MonadIO

Since: classy-prelude-1.0.0

fromByteVector :: SVector Word8 -> ByteString #

Convert a storable Vector into a ByteString.

toByteVector :: ByteString -> SVector Word8 #

Convert a ByteString into a storable Vector.

(<||>) :: Applicative a => a Bool -> a Bool -> a Bool infixr 2 #

|| lifted to an Applicative.

Since: classy-prelude-0.12.8

(<&&>) :: Applicative a => a Bool -> a Bool -> a Bool infixr 3 #

&& lifted to an Applicative.

Since: classy-prelude-0.12.8

applyDList :: DList a -> [a] -> [a] #

Synonym for apply

Since 0.11.0

asDList :: DList a -> DList a #

Force type to a DList

Since 0.11.0

unlessM :: Monad m => m Bool -> m () -> m () #

Only perform the action if the predicate returns False.

Since 0.9.2

whenM :: Monad m => m Bool -> m () -> m () #

Only perform the action if the predicate returns True.

Since 0.9.2

orElseSTM :: STM a -> STM a -> STM a #

Synonym for orElse.

ordNubBy :: Ord b => (a -> b) -> (a -> a -> Bool) -> [a] -> [a] #

same behavior as nubBy, but requires Ord and is O(n log n)

https://github.com/nh2/haskell-ordnub

ordNub :: Ord a => [a] -> [a] #

same behavior as nub, but requires Ord and is O(n log n)

https://github.com/nh2/haskell-ordnub

hashNub :: (Hashable a, Eq a) => [a] -> [a] #

same behavior as nub, but requires Hashable & Eq and is O(n log n)

https://github.com/nh2/haskell-ordnub

yieldThread :: MonadIO m => m () #

Originally yield.

traceShowM :: (Show a, Monad m) => a -> m () #

Since 0.5.9

traceShowId :: Show a => a -> a #

Since 0.5.9

traceM :: Monad m => String -> m () #

Since 0.5.9

traceId :: String -> String #

Since 0.5.9

traceShow :: Show a => a -> b -> b #

trace :: String -> a -> a #

We define our own trace (and also its variants) which provides a warning when used. So that tracing is available during development, but the compiler reminds you to not leave them in the code for production.

undefined :: HasCallStack => a #

We define our own undefined which is marked as deprecated. This makes it useful to use during development, but lets you more easily get notifications if you accidentally ship partial code in production.

The classy prelude recommendation for when you need to really have a partial function in production is to use error with a very descriptive message so that, in case an exception is thrown, you get more information than Prelude.undefined.

Since 0.5.5

sortWith :: (Ord a, IsSequence c) => (Element c -> a) -> c -> c #

Sort elements using the user supplied function to project something out of each element. Inspired by http://hackage.haskell.org/packages/archive/base/latest/doc/html/GHC-Exts.html#v:sortWith.

print :: (Show a, MonadIO m) => a -> m () #

asString :: [Char] -> [Char] #

asSet :: Set a -> Set a #

asMaybe :: Maybe a -> Maybe a #

asMap :: Map k v -> Map k v #

asList :: [a] -> [a] #

asHashMap :: HashMap k v -> HashMap k v #

intersect :: SetContainer a => a -> a -> a #

An alias for intersection.

(\\) :: SetContainer a => a -> a -> a infixl 9 #

An alias for difference.

(++) :: Monoid m => m -> m -> m infixr 5 #

map :: Functor f => (a -> b) -> f a -> f b #

readMay :: (Element c ~ Char, MonoFoldable c, Read a) => c -> Maybe a #

charToUpper :: Char -> Char #

Convert a character to upper case.

Character-based case conversion is lossy in comparison to string-based toUpper. For instance, ß won't be converted to SS.

charToLower :: Char -> Char #

Convert a character to lower case.

Character-based case conversion is lossy in comparison to string-based toLower. For instance, İ will be converted to i, instead of i̇.

tlshow :: Show a => a -> LText #

tshow :: Show a => a -> Text #

newtype Day #

The Modified Julian Day is a standard count of days, with zero being the day 1858-11-17.

Instances

Instances details
FromJSON Day 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Day 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Day 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Day 
Instance details

Defined in Data.Aeson.Types.ToJSON

Data Day 
Instance details

Defined in Data.Time.Calendar.Days

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Day -> c Day #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Day #

toConstr :: Day -> Constr #

dataTypeOf :: Day -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Day) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Day) #

gmapT :: (forall b. Data b => b -> b) -> Day -> Day #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Day -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Day -> r #

gmapQ :: (forall d. Data d => d -> u) -> Day -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Day -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Day -> m Day #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Day -> m Day #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Day -> m Day #

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

Ix Day 
Instance details

Defined in Data.Time.Calendar.Days

Methods

range :: (Day, Day) -> [Day] #

index :: (Day, Day) -> Day -> Int #

unsafeIndex :: (Day, Day) -> Day -> Int #

inRange :: (Day, Day) -> Day -> Bool #

rangeSize :: (Day, Day) -> Int #

unsafeRangeSize :: (Day, Day) -> Int #

NFData Day 
Instance details

Defined in Data.Time.Calendar.Days

Methods

rnf :: Day -> () #

Eq Day 
Instance details

Defined in Data.Time.Calendar.Days

Methods

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

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

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 #

FromHttpApiData Day
>>> toGregorian <$> parseUrlPiece "2016-12-01"
Right (2016,12,1)
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Day
>>> toUrlPiece (fromGregorian 2015 10 03)
"2015-10-03"
Instance details

Defined in Web.Internal.HttpApiData

PathPiece Day 
Instance details

Defined in Web.PathPieces

PersistField Day 
Instance details

Defined in Database.Persist.Class.PersistField

PersistFieldSql Day 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Day -> SqlType #

type Rep Day 
Instance details

Defined in Text.PrettyPrint.GenericPretty.Instance

type Rep Day = D1 ('MetaData "Day" "Data.Time.Calendar.Days" "time-1.9.3-4QADtHlAqaxHrrZdcJt0iS" 'True) (C1 ('MetaCons "ModifiedJulianDay" 'PrefixI 'True) (S1 ('MetaSel ('Just "toModifiedJulianDay") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Integer)))

toGregorian :: Day -> (Integer, Int, Int) #

Convert to proleptic Gregorian calendar. First element of result is year, second month number (1-12), third day (1-31).

fromGregorian :: Integer -> Int -> Int -> Day #

Convert from proleptic Gregorian calendar. First argument is year, second month number (1-12), third day (1-31). Invalid values will be clipped to the correct range, month first, then day.

getCurrentTime :: IO UTCTime #

Get the current UTCTime from the system clock.

defaultTimeLocale :: TimeLocale #

Locale representing American usage.

knownTimeZones contains only the ten time-zones mentioned in RFC 822 sec. 5: "UT", "GMT", "EST", "EDT", "CST", "CDT", "MST", "MDT", "PST", "PDT". Note that the parsing functions will regardless parse "UTC", single-letter military time-zones, and +HHMM format.

formatTime :: FormatTime t => TimeLocale -> String -> t -> String #

Substitute various time-related information for each %-code in the string, as per formatCharacter.

The general form is %<modifier><width><alternate><specifier>, where <modifier>, <width>, and <alternate> are optional.

<modifier>

glibc-style modifiers can be used before the specifier (here marked as z):

%-z
no padding
%_z
pad with spaces
%0z
pad with zeros
%^z
convert to upper case
%#z
convert to lower case (consistently, unlike glibc)

<width>

Width digits can also be used after any modifiers and before the specifier (here marked as z), for example:

%4z
pad to 4 characters (with default padding character)
%_12z
pad with spaces to 12 characters

<alternate>

An optional E character indicates an alternate formatting. Currently this only affects %Z and %z.

%Ez
alternate formatting

<specifier>

For all types (note these three are done by formatTime, not by formatCharacter):

%%
%
%t
tab
%n
newline

TimeZone

For TimeZone (and ZonedTime and UTCTime):

%z
timezone offset in the format ±HHMM
%Ez
timezone offset in the format ±HH:MM
%Z
timezone name (or else offset in the format ±HHMM)
%EZ
timezone name (or else offset in the format ±HH:MM)

LocalTime

For LocalTime (and ZonedTime and UTCTime and UniversalTime):

%c
as dateTimeFmt locale (e.g. %a %b %e %H:%M:%S %Z %Y)

TimeOfDay

For TimeOfDay (and LocalTime and ZonedTime and UTCTime and UniversalTime):

%R
same as %H:%M
%T
same as %H:%M:%S
%X
as timeFmt locale (e.g. %H:%M:%S)
%r
as time12Fmt locale (e.g. %I:%M:%S %p)
%P
day-half of day from (amPm locale), converted to lowercase, am, pm
%p
day-half of day from (amPm locale), AM, PM
%H
hour of day (24-hour), 0-padded to two chars, 00 - 23
%k
hour of day (24-hour), space-padded to two chars, 0 - 23
%I
hour of day-half (12-hour), 0-padded to two chars, 01 - 12
%l
hour of day-half (12-hour), space-padded to two chars, 1 - 12
%M
minute of hour, 0-padded to two chars, 00 - 59
%S
second of minute (without decimal part), 0-padded to two chars, 00 - 60
%q
picosecond of second, 0-padded to twelve chars, 000000000000 - 999999999999.
%Q
decimal point and fraction of second, up to 12 second decimals, without trailing zeros. For a whole number of seconds, %Q omits the decimal point unless padding is specified.

UTCTime and ZonedTime

For UTCTime and ZonedTime:

%s
number of whole seconds since the Unix epoch. For times before the Unix epoch, this is a negative number. Note that in %s.%q and %s%Q the decimals are positive, not negative. For example, 0.9 seconds before the Unix epoch is formatted as -1.1 with %s%Q.

DayOfWeek

For DayOfWeek (and Day and LocalTime and ZonedTime and UTCTime and UniversalTime):

%u
day of week number for Week Date format, 1 (= Monday) - 7 (= Sunday)
%w
day of week number, 0 (= Sunday) - 6 (= Saturday)
%a
day of week, short form (snd from wDays locale), Sun - Sat
%A
day of week, long form (fst from wDays locale), Sunday - Saturday

Day

For Day (and LocalTime and ZonedTime and UTCTime and UniversalTime):

%D
same as %m/%d/%y
%F
same as %Y-%m-%d
%x
as dateFmt locale (e.g. %m/%d/%y)
%Y
year, no padding. Note %0Y and %_Y pad to four chars
%y
year of century, 0-padded to two chars, 00 - 99
%C
century, no padding. Note %0C and %_C pad to two chars
%B
month name, long form (fst from months locale), January - December
%b, %h
month name, short form (snd from months locale), Jan - Dec
%m
month of year, 0-padded to two chars, 01 - 12
%d
day of month, 0-padded to two chars, 01 - 31
%e
day of month, space-padded to two chars, 1 - 31
%j
day of year, 0-padded to three chars, 001 - 366
%f
century for Week Date format, no padding. Note %0f and %_f pad to two chars
%V
week of year for Week Date format, 0-padded to two chars, 01 - 53
%U
week of year where weeks start on Sunday (as sundayStartWeek), 0-padded to two chars, 00 - 53
%W
week of year where weeks start on Monday (as mondayStartWeek), 0-padded to two chars, 00 - 53

Duration types

The specifiers for DiffTime, NominalDiffTime, CalendarDiffDays, and CalendarDiffTime are semantically separate from the other types. Specifiers on negative time differences will generally be negative (think rem rather than mod).

NominalDiffTime and DiffTime

Note that a "minute" of DiffTime is simply 60 SI seconds, rather than a minute of civil time. Use NominalDiffTime to work with civil time, ignoring any leap seconds.

For NominalDiffTime and DiffTime:

%w
total whole weeks
%d
total whole days
%D
whole days of week
%h
total whole hours
%H
whole hours of day
%m
total whole minutes
%M
whole minutes of hour
%s
total whole seconds
%Es
total seconds, with decimal point and up to <width> (default 12) decimal places, without trailing zeros. For a whole number of seconds, %Es omits the decimal point unless padding is specified.
%0Es
total seconds, with decimal point and <width> (default 12) decimal places.
%S
whole seconds of minute
%ES
seconds of minute, with decimal point and up to <width> (default 12) decimal places, without trailing zeros. For a whole number of seconds, %ES omits the decimal point unless padding is specified.
%0ES
seconds of minute as two digits, with decimal point and <width> (default 12) decimal places.

CalendarDiffDays

For CalendarDiffDays (and CalendarDiffTime):

%y
total years
%b
total months
%B
months of year
%w
total weeks, not including months
%d
total days, not including months
%D
days of week

CalendarDiffTime

For CalendarDiffTime:

%h
total hours, not including months
%H
hours of day
%m
total minutes, not including months
%M
minutes of hour
%s
total whole seconds, not including months
%Es
total seconds, not including months, with decimal point and up to <width> (default 12) decimal places, without trailing zeros. For a whole number of seconds, %Es omits the decimal point unless padding is specified.
%0Es
total seconds, not including months, with decimal point and <width> (default 12) decimal places.
%S
whole seconds of minute
%ES
seconds of minute, with decimal point and up to <width> (default 12) decimal places, without trailing zeros. For a whole number of seconds, %ES omits the decimal point unless padding is specified.
%0ES
seconds of minute as two digits, with decimal point and <width> (default 12) decimal places.

parseTimeM #

Arguments

:: (MonadFail m, ParseTime t) 
=> Bool

Accept leading and trailing whitespace?

-> TimeLocale

Time locale.

-> String

Format string.

-> String

Input string.

-> m t

Return the time value, or fail if the input could not be parsed using the given format.

Parses a time value given a format string. Supports the same %-codes as formatTime, including %-, %_ and %0 modifiers, however padding widths are not supported. Case is not significant in the input string. Some variations in the input are accepted:

%z
accepts any of ±HHMM or ±HH:MM.
%Z
accepts any string of letters, or any of the formats accepted by %z.
%0Y
accepts exactly four digits.
%0G
accepts exactly four digits.
%0C
accepts exactly two digits.
%0f
accepts exactly two digits.

For example, to parse a date in YYYY-MM-DD format, while allowing the month and date to have optional leading zeros (notice the - modifier used for %m and %d):

Prelude Data.Time> parseTimeM True defaultTimeLocale "%Y-%-m-%-d" "2010-3-04" :: Maybe Day
Just 2010-03-04

parseTime #

Arguments

:: ParseTime t 
=> TimeLocale

Time locale.

-> String

Format string.

-> String

Input string.

-> Maybe t

The time value, or Nothing if the input could not be parsed using the given format.

primToPrim :: (PrimBase m1, PrimMonad m2, PrimState m1 ~ PrimState m2) => m1 a -> m2 a #

Convert a PrimBase to another monad with the same state token.

primToIO :: (PrimBase m, PrimState m ~ RealWorld) => m a -> IO a #

Convert a PrimBase with a RealWorld state token to IO

primToST :: PrimBase m => m a -> ST (PrimState m) a #

Convert a PrimBase to ST

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.

data DList a #

A difference list is an abstraction representing a list that supports \(\mathcal{O}\)(1) append and snoc operations, making it useful for replacing frequent applications of ++ such as logging and pretty printing (esp. if those uses of ++ are left-nested).

Instances

Instances details
FromJSON1 DList 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (DList a) #

liftParseJSONList :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [DList a] #

ToJSON1 DList 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Value) -> ([a] -> Value) -> DList a -> Value #

liftToJSONList :: (a -> Value) -> ([a] -> Value) -> [DList a] -> Value #

liftToEncoding :: (a -> Encoding) -> ([a] -> Encoding) -> DList a -> Encoding #

liftToEncodingList :: (a -> Encoding) -> ([a] -> Encoding) -> [DList a] -> Encoding #

MonadFail DList 
Instance details

Defined in Data.DList.Internal

Methods

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

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

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

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 #

Functor DList 
Instance details

Defined in Data.DList.Internal

Methods

fmap :: (a -> b) -> DList a -> DList b #

(<$) :: a -> DList b -> DList 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 #

MonadPlus DList 
Instance details

Defined in Data.DList.Internal

Methods

mzero :: DList a #

mplus :: DList a -> DList a -> DList a #

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

FromJSON a => FromJSON (DList a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON a => ToJSON (DList a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

a ~ Char => IsString (DList a) 
Instance details

Defined in Data.DList.Internal

Methods

fromString :: String -> DList 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 #

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 #

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

Read a => Read (DList a) 
Instance details

Defined in Data.DList.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 #

NFData a => NFData (DList a) 
Instance details

Defined in Data.DList.Internal

Methods

rnf :: DList a -> () #

Eq a => Eq (DList a) 
Instance details

Defined in Data.DList.Internal

Methods

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

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

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 #

type Item (DList a) 
Instance details

Defined in Data.DList.Internal

type Item (DList a) = a
type Element (DList a) 
Instance details

Defined in Data.MonoTraversable.Instances

type Element (DList a) = a
type Index (DList a) 
Instance details

Defined in Data.MonoTraversable.Instances

type Index (DList a) = Int

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

runResourceT :: MonadUnliftIO m => ResourceT m a -> m a #

Unwrap a ResourceT transformer, and call all registered release actions.

Note that there is some reference counting involved due to resourceForkIO. If multiple threads are sharing the same collection of resources, only the last call to runResourceT will deallocate the resources.

NOTE Since version 1.2.0, this function will throw a ResourceCleanupException if any of the cleanup functions throw an exception.

Since: resourcet-0.3.0

withAcquire :: MonadUnliftIO m => Acquire a -> (a -> m b) -> m b #

Longer name for with, in case with is not obvious enough in context.

Since: resourcet-1.2.0

allocateAcquire :: MonadResource m => Acquire a -> m (ReleaseKey, a) #

Allocate a resource and register an action with the MonadResource to free the resource.

Since: resourcet-1.1.0

class MonadIO m => MonadResource (m :: Type -> Type) where #

A Monad which allows for safe resource allocation. In theory, any monad transformer stack which includes a ResourceT can be an instance of MonadResource.

Note: runResourceT has a requirement for a MonadUnliftIO m monad, which allows control operations to be lifted. A MonadResource does not have this requirement. This means that transformers such as ContT can be an instance of MonadResource. However, the ContT wrapper will need to be unwrapped before calling runResourceT.

Since 0.3.0

Methods

liftResourceT :: ResourceT IO a -> m a #

Lift a ResourceT IO action into the current Monad.

Since 0.4.0

Instances

Instances details
MonadResource m => MonadResource (KatipT m) 
Instance details

Defined in Katip.Core

Methods

liftResourceT :: ResourceT IO a -> KatipT m a #

MonadResource m => MonadResource (KatipContextT m) 
Instance details

Defined in Katip.Monadic

MonadResource m => MonadResource (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

liftResourceT :: ResourceT IO a -> LoggingT m a #

MonadResource m => MonadResource (NoLoggingT m) 
Instance details

Defined in Control.Monad.Logger

MonadIO m => MonadResource (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

liftResourceT :: ResourceT IO a -> ResourceT m a #

MonadResource m => MonadResource (ListT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

liftResourceT :: ResourceT IO a -> ListT m a #

MonadResource m => MonadResource (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

liftResourceT :: ResourceT IO a -> MaybeT m a #

MonadResource (HandlerFor site) 
Instance details

Defined in Yesod.Core.Types

Methods

liftResourceT :: ResourceT IO a -> HandlerFor site a #

MonadResource (WidgetFor site) 
Instance details

Defined in Yesod.Core.Types

Methods

liftResourceT :: ResourceT IO a -> WidgetFor site 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 #

MonadResource m => MonadResource (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

liftResourceT :: ResourceT IO a -> IdentityT 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 #

MonadResource m => MonadResource (StateT s m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

liftResourceT :: ResourceT IO 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 #

(Monoid w, MonadResource m) => MonadResource (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

liftResourceT :: ResourceT IO a -> WriterT w m a #

(Monoid w, MonadResource m) => MonadResource (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

liftResourceT :: ResourceT IO a -> WriterT w m a #

MonadResource (SubHandlerFor child master) 
Instance details

Defined in Yesod.Core.Types

Methods

liftResourceT :: ResourceT IO a -> SubHandlerFor child master a #

MonadResource m => MonadResource (ConduitT i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

liftResourceT :: ResourceT IO a -> ConduitT i o m a #

MonadResource m => MonadResource (ContT r m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

liftResourceT :: ResourceT IO a -> ContT r m a #

(Monoid w, MonadResource m) => MonadResource (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

liftResourceT :: ResourceT IO a -> RWST r w s m a #

(Monoid w, MonadResource m) => MonadResource (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

liftResourceT :: ResourceT IO a -> RWST r w s m a #

MonadResource m => MonadResource (Pipe l i o u m) 
Instance details

Defined in Data.Conduit.Internal.Pipe

Methods

liftResourceT :: ResourceT IO a -> Pipe l i o u m a #

data ResourceT (m :: Type -> Type) a #

The Resource transformer. This transformer keeps track of all registered actions, and calls them upon exit (via runResourceT). Actions may be registered via register, or resources may be allocated atomically via allocate. allocate corresponds closely to bracket.

Releasing may be performed before exit via the release function. This is a highly recommended optimization, as it will ensure that scarce resources are freed early. Note that calling release will deregister the action, so that a release action will only ever be called once.

Since 0.3.0

Instances

Instances details
MonadTrans ResourceT 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

lift :: Monad m => m a -> ResourceT m a #

MonadRWS r w s m => MonadRWS r w s (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

MonadError e m => MonadError e (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

throwError :: e -> ResourceT m a #

catchError :: ResourceT m a -> (e -> ResourceT m a) -> ResourceT 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 #

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 #

MonadWriter w m => MonadWriter w (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

writer :: (a, w) -> ResourceT m a #

tell :: w -> ResourceT m () #

listen :: ResourceT m a -> ResourceT m (a, w) #

pass :: ResourceT m (a, w -> w) -> ResourceT 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 #

MonadFix m => MonadFix (ResourceT m)

Since: resourcet-1.1.8

Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

mfix :: (a -> ResourceT m a) -> ResourceT m a #

MonadIO m => MonadIO (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

liftIO :: IO a -> ResourceT 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] #

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 #

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 #

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 #

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 #

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 #

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

MonadThrow m => MonadThrow (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

throwM :: Exception e => e -> ResourceT m a #

Katip m => Katip (ResourceT m) 
Instance details

Defined in Katip.Core

(KatipContext m, Katip (ResourceT m)) => KatipContext (ResourceT m) 
Instance details

Defined in Katip.Monadic

MonadLogger m => MonadLogger (ResourceT m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> ResourceT m () #

MonadLoggerIO m => MonadLoggerIO (ResourceT m) 
Instance details

Defined in Control.Monad.Logger

Methods

askLoggerIO :: ResourceT m (Loc -> LogSource -> LogLevel -> LogStr -> IO ()) #

MonadCont m => MonadCont (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

callCC :: ((a -> ResourceT m b) -> ResourceT m a) -> ResourceT m a #

PrimMonad m => PrimMonad (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Associated Types

type PrimState (ResourceT m) #

Methods

primitive :: (State# (PrimState (ResourceT m)) -> (# State# (PrimState (ResourceT m)), a #)) -> ResourceT m a #

MonadIO m => MonadResource (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

liftResourceT :: ResourceT IO a -> ResourceT m a #

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 #

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 (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

mkAcquireType #

Arguments

:: IO a

acquire the resource

-> (a -> ReleaseType -> IO ())

free the resource

-> Acquire a 

Same as mkAcquire, but the cleanup function will be informed of how cleanup was initiated. This allows you to distinguish, for example, between normal and exceptional exits.

To acquire and free the resource in an arbitrary monad with MonadUnliftIO, do the following:

acquire <- withRunInIO $ \runInIO ->
  return $ mkAcquireType (runInIO create) (\a -> runInIO . free a)

Note that this is only safe if the Acquire is run and freed within the same monadic scope it was created in.

Since: resourcet-1.1.2

mkAcquire #

Arguments

:: IO a

acquire the resource

-> (a -> IO ())

free the resource

-> Acquire a 

Create an Acquire value using the given allocate and free functions.

To acquire and free the resource in an arbitrary monad with MonadUnliftIO, do the following:

acquire <- withRunInIO $ \runInIO ->
  return $ mkAcquire (runInIO create) (runInIO . free)

Note that this is only safe if the Acquire is run and freed within the same monadic scope it was created in.

Since: resourcet-1.1.0

data ReleaseType #

The way in which a release is called.

Since: resourcet-1.1.2

Instances

Instances details
Bounded ReleaseType 
Instance details

Defined in Data.Acquire.Internal

Enum ReleaseType 
Instance details

Defined in Data.Acquire.Internal

Read ReleaseType 
Instance details

Defined in Data.Acquire.Internal

Show ReleaseType 
Instance details

Defined in Data.Acquire.Internal

Eq ReleaseType 
Instance details

Defined in Data.Acquire.Internal

Ord ReleaseType 
Instance details

Defined in Data.Acquire.Internal

data Acquire a #

A method for acquiring a scarce resource, providing the means of freeing it when no longer needed. This data type provides Functor/Applicative/Monad instances for composing different resources together. You can allocate these resources using either the bracket pattern (via with) or using ResourceT (via allocateAcquire).

This concept was originally introduced by Gabriel Gonzalez and described at: http://www.haskellforall.com/2013/06/the-resource-applicative.html. The implementation in this package is slightly different, due to taking a different approach to async exception safety.

Since: resourcet-1.1.0

Instances

Instances details
MonadIO Acquire 
Instance details

Defined in Data.Acquire.Internal

Methods

liftIO :: IO a -> Acquire 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 #

Functor Acquire 
Instance details

Defined in Data.Acquire.Internal

Methods

fmap :: (a -> b) -> Acquire a -> Acquire b #

(<$) :: a -> Acquire b -> Acquire 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 #

newtype ZipConduit i o (m :: Type -> Type) r #

Provides an alternative Applicative instance for ConduitT. In this instance, every incoming value is provided to all ConduitTs, and output is coalesced together. Leftovers from individual ConduitTs will be used within that component, and then discarded at the end of their computation. Output and finalizers will both be handled in a left-biased manner.

As an example, take the following program:

main :: IO ()
main = do
    let src = mapM_ yield [1..3 :: Int]
        conduit1 = CL.map (+1)
        conduit2 = CL.concatMap (replicate 2)
        conduit = getZipConduit $ ZipConduit conduit1 <* ZipConduit conduit2
        sink = CL.mapM_ print
    src $$ conduit =$ sink

It will produce the output: 2, 1, 1, 3, 2, 2, 4, 3, 3

Since 1.0.17

Constructors

ZipConduit 

Fields

Instances

Instances details
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 #

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 #

newtype ZipSink i (m :: Type -> Type) r #

A wrapper for defining an Applicative instance for Sinks which allows to combine sinks together, generalizing zipSinks. A combined sink distributes the input to all its participants and when all finish, produces the result. This allows to define functions like

sequenceSinks :: (Monad m)
          => [Sink i m r] -> Sink i m [r]
sequenceSinks = getZipSink . sequenceA . fmap ZipSink

Note that the standard Applicative instance for conduits works differently. It feeds one sink with input until it finishes, then switches to another, etc., and at the end combines their results.

This newtype is in fact a type constrained version of ZipConduit, and has the same behavior. It's presented as a separate type since (1) it historically predates ZipConduit, and (2) the type constraining can make your code clearer (and thereby make your error messages more easily understood).

Since 1.0.13

Constructors

ZipSink 

Fields

Instances

Instances details
Monad m => Applicative (ZipSink i m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

pure :: a -> ZipSink i m a #

(<*>) :: ZipSink i m (a -> b) -> ZipSink i m a -> ZipSink i m b #

liftA2 :: (a -> b -> c) -> ZipSink i m a -> ZipSink i m b -> ZipSink i m c #

(*>) :: ZipSink i m a -> ZipSink i m b -> ZipSink i m b #

(<*) :: ZipSink i m a -> ZipSink i m b -> ZipSink i m a #

Monad m => 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 #

newtype ZipSource (m :: Type -> Type) o #

A wrapper for defining an Applicative instance for Sources which allows to combine sources together, generalizing zipSources. A combined source will take input yielded from each of its Sources until any of them stop producing output.

Since 1.0.13

Constructors

ZipSource 

Fields

Instances

Instances details
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 #

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 #

data Flush a #

Provide for a stream of data that can be flushed.

A number of Conduits (e.g., zlib compression) need the ability to flush the stream at some point. This provides a single wrapper datatype to be used in all such circumstances.

Since 0.3.0

Constructors

Chunk a 
Flush 

Instances

Instances details
Functor Flush 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

fmap :: (a -> b) -> Flush a -> Flush b #

(<$) :: a -> Flush b -> Flush a #

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 #

Eq a => Eq (Flush a) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

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

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

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 #

ToFlushBuilder (Flush Html) 
Instance details

Defined in Yesod.Core.Content

ToFlushBuilder (Flush Builder) 
Instance details

Defined in Yesod.Core.Content

ToFlushBuilder (Flush ByteString) 
Instance details

Defined in Yesod.Core.Content

ToFlushBuilder (Flush ByteString) 
Instance details

Defined in Yesod.Core.Content

ToFlushBuilder (Flush Text) 
Instance details

Defined in Yesod.Core.Content

ToFlushBuilder (Flush Text) 
Instance details

Defined in Yesod.Core.Content

ToFlushBuilder (Flush String) 
Instance details

Defined in Yesod.Core.Content

type Conduit i (m :: Type -> Type) o = ConduitT i o m () #

Consumes a stream of input values and produces a stream of output values, without producing a final result.

Since 0.5.0

type Consumer i (m :: Type -> Type) r = forall o. ConduitT i o m r #

A component which consumes a stream of input values and produces a final result, regardless of the output stream. A Consumer is a generalization of a Sink, and can be used as either a Sink or a Conduit.

Since 1.0.0

type Sink i = ConduitT i Void #

Consumes a stream of input values and produces a final result, without producing any output.

type Sink i m r = ConduitT i Void m r

Since 0.5.0

type Producer (m :: Type -> Type) o = forall i. ConduitT i o m () #

A component which produces a stream of output values, regardless of the input stream. A Producer is a generalization of a Source, and can be used as either a Source or a Conduit.

Since 1.0.0

type Source (m :: Type -> Type) o = ConduitT () o m () #

Provides a stream of output values, without consuming any input or producing a final result.

Since 0.5.0

type ConduitM = ConduitT #

Same as ConduitT, for backwards compat

data SealedConduitT i o (m :: Type -> Type) r #

In order to provide for efficient monadic composition, the ConduitT type is implemented internally using a technique known as the codensity transform. This allows for cheap appending, but makes one case much more expensive: partially running a ConduitT and that capturing the new state.

This data type is the same as ConduitT, but does not use the codensity transform technique.

Since: conduit-1.3.0

Instances

Instances details
ToFlushBuilder builder => ToContent (SealedConduitT () builder (ResourceT IO) ()) 
Instance details

Defined in Yesod.Core.Content

Methods

toContent :: SealedConduitT () builder (ResourceT IO) () -> Content #

data ConduitT i o (m :: Type -> Type) r #

Core datatype of the conduit package. This type represents a general component which can consume a stream of input values i, produce a stream of output values o, perform actions in the m monad, and produce a final result r. The type synonyms provided here are simply wrappers around this type.

Since 1.3.0

Instances

Instances details
MonadRWS r w s m => MonadRWS r w s (ConduitT i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

MonadError e m => MonadError e (ConduitT i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

throwError :: e -> ConduitT i o m a #

catchError :: ConduitT i o m a -> (e -> ConduitT i o m a) -> ConduitT i o 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 #

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 #

MonadWriter w m => MonadWriter w (ConduitT i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

writer :: (a, w) -> ConduitT i o m a #

tell :: w -> ConduitT i o m () #

listen :: ConduitT i o m a -> ConduitT i o m (a, w) #

pass :: ConduitT i o m (a, w -> w) -> ConduitT i o 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 #

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 #

MonadIO m => MonadIO (ConduitT i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

liftIO :: IO a -> ConduitT i o m a #

Applicative (ConduitT i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

pure :: a -> ConduitT i o m a #

(<*>) :: ConduitT i o m (a -> b) -> ConduitT i o m a -> ConduitT i o m b #

liftA2 :: (a -> b -> c) -> ConduitT i o m a -> ConduitT i o m b -> ConduitT i o m c #

(*>) :: ConduitT i o m a -> ConduitT i o m b -> ConduitT i o m b #

(<*) :: ConduitT i o m a -> ConduitT i o m b -> ConduitT i o m a #

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 #

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 #

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 #

MonadLogger m => MonadLogger (ConduitM i o m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> ConduitM i o m () #

MonadLoggerIO m => MonadLoggerIO (ConduitM i o m) 
Instance details

Defined in Control.Monad.Logger

Methods

askLoggerIO :: ConduitM i o m (Loc -> LogSource -> LogLevel -> LogStr -> IO ()) #

PrimMonad m => PrimMonad (ConduitT i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Associated Types

type PrimState (ConduitT i o m) #

Methods

primitive :: (State# (PrimState (ConduitT i o m)) -> (# State# (PrimState (ConduitT i o m)), a #)) -> ConduitT i o m a #

MonadResource m => MonadResource (ConduitT i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

liftResourceT :: ResourceT IO a -> ConduitT i o m a #

MonadHandler m => MonadHandler (ConduitM i o m) 
Instance details

Defined in Yesod.Core.Class.Handler

Associated Types

type HandlerSite (ConduitM i o m) #

type SubHandlerSite (ConduitM i o m) #

MonadWidget m => MonadWidget (ConduitM i o m) 
Instance details

Defined in Yesod.Core.Class.Handler

Methods

liftWidget :: WidgetFor (HandlerSite (ConduitM i o m)) a -> ConduitM i o m a #

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

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

ToFlushBuilder builder => ToContent (ConduitT () builder (ResourceT IO) ()) 
Instance details

Defined in Yesod.Core.Content

Methods

toContent :: ConduitT () builder (ResourceT IO) () -> Content #

type PrimState (ConduitT i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

type PrimState (ConduitT i o m) = PrimState m
type HandlerSite (ConduitM i o m) 
Instance details

Defined in Yesod.Core.Class.Handler

type SubHandlerSite (ConduitM i o m) 
Instance details

Defined in Yesod.Core.Class.Handler

sealConduitT :: forall i o (m :: Type -> Type) r. ConduitT i o m r -> SealedConduitT i o m r #

unsealConduitT :: forall (m :: Type -> Type) i o r. Monad m => SealedConduitT i o m r -> ConduitT i o m r #

toProducer :: forall (m :: Type -> Type) a i. Monad m => Source m a -> ConduitT i a m () #

Generalize a Source to a Producer.

Since 1.0.0

toConsumer :: forall (m :: Type -> Type) a b. Monad m => Sink a m b -> Consumer a m b #

Generalize a Sink to a Consumer.

Since 1.0.0

catchC :: forall (m :: Type -> Type) e i o r. (MonadUnliftIO m, Exception e) => ConduitT i o m r -> (e -> ConduitT i o m r) -> ConduitT i o m r #

Catch all exceptions thrown by the current component of the pipeline.

Note: this will not catch exceptions thrown by other components! For example, if an exception is thrown in a Source feeding to a Sink, and the Sink uses catchC, the exception will not be caught.

Due to this behavior (as well as lack of async exception safety), you should not try to implement combinators such as onException in terms of this primitive function.

Note also that the exception handling will not be applied to any finalizers generated by this conduit.

Since 1.0.11

handleC :: forall (m :: Type -> Type) e i o r. (MonadUnliftIO m, Exception e) => (e -> ConduitT i o m r) -> ConduitT i o m r -> ConduitT i o m r #

The same as flip catchC.

Since 1.0.11

tryC :: forall (m :: Type -> Type) e i o r. (MonadUnliftIO m, Exception e) => ConduitT i o m r -> ConduitT i o m (Either e r) #

A version of try for use within a pipeline. See the comments in catchC for more details.

Since 1.0.11

fuseReturnLeftovers :: forall (m :: Type -> Type) a b c r. Monad m => ConduitT a b m () -> ConduitT b c m r -> ConduitT a c m (r, [b]) #

Same as normal fusion (e.g. =$=), except instead of discarding leftovers from the downstream component, return them.

Since 1.0.17

fuseLeftovers :: forall (m :: Type -> Type) b a c r. Monad m => ([b] -> [a]) -> ConduitT a b m () -> ConduitT b c m r -> ConduitT a c m r #

Similar to fuseReturnLeftovers, but use the provided function to convert downstream leftovers to upstream leftovers.

Since 1.0.17

mergeSource :: forall (m :: Type -> Type) i a. Monad m => Source m i -> Conduit a m (i, a) #

Merge a Source into a Conduit. The new conduit will stop processing once either source or upstream have been exhausted.

passthroughSink #

Arguments

:: Monad m 
=> Sink i m r 
-> (r -> m ())

finalizer

-> Conduit i m i 

Turn a Sink into a Conduit in the following way:

  • All input passed to the Sink is yielded downstream.
  • When the Sink finishes processing, the result is passed to the provided to the finalizer function.

Note that the Sink will stop receiving input as soon as the downstream it is connected to shuts down.

An example usage would be to write the result of a Sink to some mutable variable while allowing other processing to continue.

Since 1.1.0

sourceToList :: Monad m => Source m a -> m [a] #

Convert a Source into a list. The basic functionality can be explained as:

sourceToList src = src $$ Data.Conduit.List.consume

However, sourceToList is able to produce its results lazily, which cannot be done when running a conduit pipeline in general. Unlike the Data.Conduit.Lazy module (in conduit-extra), this function performs no unsafe I/O operations, and therefore can only be as lazily as the underlying monad.

Since 1.2.6

connect :: Monad m => ConduitT () a m () -> ConduitT a Void m r -> m r #

Equivalent to using runConduit and .| together.

Since 1.2.3

fuse :: forall (m :: Type -> Type) a b c r. Monad m => Conduit a m b -> ConduitM b c m r -> ConduitM a c m r #

Named function synonym for .|

Equivalent to .| and =$=. However, the latter is deprecated and will be removed in a future version.

Since 1.2.3

(.|) infixr 2 #

Arguments

:: forall (m :: Type -> Type) a b c r. Monad m 
=> ConduitM a b m ()

upstream

-> ConduitM b c m r

downstream

-> ConduitM a c m r 

Combine two Conduits together into a new Conduit (aka fuse).

Output from the upstream (left) conduit will be fed into the downstream (right) conduit. Processing will terminate when downstream (right) returns. Leftover data returned from the right Conduit will be discarded.

Equivalent to fuse and =$=, however the latter is deprecated and will be removed in a future version.

Note that, while this operator looks like categorical composition (from Control.Category), there are a few reasons it's different:

  • The position of the type parameters to ConduitT do not match. We would need to change ConduitT i o m r to ConduitT r m i o, which would preclude a Monad or MonadTrans instance.
  • The result value from upstream and downstream are allowed to differ between upstream and downstream. In other words, we would need the type signature here to look like ConduitT a b m r -> ConduitT b c m r -> ConduitT a c m r.
  • Due to leftovers, we do not have a left identity in Conduit. This can be achieved with the underlying Pipe datatype, but this is not generally recommended. See https://stackoverflow.com/a/15263700.

Since: conduit-1.2.8

($$) :: Monad m => Source m a -> Sink a m b -> m b infixr 0 #

The connect operator, which pulls data from a source and pushes to a sink. If you would like to keep the Source open to be used for other operations, use the connect-and-resume operator $$+.

Since 0.4.0

($=) :: forall (m :: Type -> Type) a b c r. Monad m => Conduit a m b -> ConduitT b c m r -> ConduitT a c m r infixl 1 #

A synonym for =$= for backwards compatibility.

Since 0.4.0

(=$) :: forall (m :: Type -> Type) a b c r. Monad m => Conduit a m b -> ConduitT b c m r -> ConduitT a c m r infixr 2 #

A synonym for =$= for backwards compatibility.

Since 0.4.0

(=$=) :: forall (m :: Type -> Type) a b c r. Monad m => Conduit a m b -> ConduitT b c m r -> ConduitT a c m r infixr 2 #

Deprecated fusion operator.

Since 0.4.0

await :: forall (m :: Type -> Type) i. Monad m => Consumer i m (Maybe i) #

Wait for a single input value from upstream. If no data is available, returns Nothing. Once await returns Nothing, subsequent calls will also return Nothing.

Since 0.5.0

yield #

Arguments

:: forall (m :: Type -> Type) o i. Monad m 
=> o

output value

-> ConduitT i o m () 

Send a value downstream to the next component to consume. If the downstream component terminates, this call will never return control.

Since 0.5.0

yieldM :: Monad m => m o -> ConduitT i o m () #

Send a monadic value downstream for the next component to consume.

Since: conduit-1.2.7

leftover :: forall i o (m :: Type -> Type). i -> ConduitT i o m () #

Provide a single piece of leftover input to be consumed by the next component in the current monadic binding.

Note: it is highly encouraged to only return leftover values from input already consumed from upstream.

Since: conduit-0.5.0

runConduit :: Monad m => ConduitT () Void m r -> m r #

Run a pipeline until processing completes.

Since 1.2.1

bracketP #

Arguments

:: forall (m :: Type -> Type) a i o r. MonadResource m 
=> IO a

computation to run first ("acquire resource")

-> (a -> IO ())

computation to run last ("release resource")

-> (a -> ConduitT i o m r)

computation to run in-between

-> ConduitT i o m r 

Bracket a conduit computation between allocation and release of a resource. Two guarantees are given about resource finalization:

  1. It will be prompt. The finalization will be run as early as possible.
  2. It is exception safe. Due to usage of resourcet, the finalization will be run in the event of any exceptions.

Since 0.5.0

awaitForever :: forall (m :: Type -> Type) i o r. Monad m => (i -> ConduitT i o m r) -> ConduitT i o m () #

Wait for input forever, calling the given inner component for each piece of new input.

This function is provided as a convenience for the common pattern of awaiting input, checking if it's Just and then looping.

Since 0.5.0

transPipe :: Monad m => (forall a. m a -> n a) -> ConduitT i o m r -> ConduitT i o n r #

Transform the monad that a ConduitT lives in.

Note that the monad transforming function will be run multiple times, resulting in unintuitive behavior in some cases. For a fuller treatment, please see:

https://github.com/snoyberg/conduit/wiki/Dealing-with-monad-transformers

Since 0.4.0

mapOutput :: forall (m :: Type -> Type) o1 o2 i r. Monad m => (o1 -> o2) -> ConduitT i o1 m r -> ConduitT i o2 m r #

Apply a function to all the output values of a ConduitT.

This mimics the behavior of fmap for a Source and Conduit in pre-0.4 days. It can also be simulated by fusing with the map conduit from Data.Conduit.List.

Since 0.4.1

mapOutputMaybe :: forall (m :: Type -> Type) o1 o2 i r. Monad m => (o1 -> Maybe o2) -> ConduitT i o1 m r -> ConduitT i o2 m r #

Same as mapOutput, but use a function that returns Maybe values.

Since 0.5.0

mapInput #

Arguments

:: forall (m :: Type -> Type) i1 i2 o r. Monad m 
=> (i1 -> i2)

map initial input to new input

-> (i2 -> Maybe i1)

map new leftovers to initial leftovers

-> ConduitT i2 o m r 
-> ConduitT i1 o m r 

Apply a function to all the input values of a ConduitT.

Since 0.5.0

mapInputM #

Arguments

:: Monad m 
=> (i1 -> m i2)

map initial input to new input

-> (i2 -> m (Maybe i1))

map new leftovers to initial leftovers

-> ConduitT i2 o m r 
-> ConduitT i1 o m r 

Apply a monadic action to all the input values of a ConduitT.

Since 1.3.2

($$+) :: Monad m => Source m a -> Sink a m b -> m (SealedConduitT () a m (), b) infixr 0 #

The connect-and-resume operator. This does not close the Source, but instead returns it to be used again. This allows a Source to be used incrementally in a large program, without forcing the entire program to live in the Sink monad.

Mnemonic: connect + do more.

Since 0.5.0

($$++) :: Monad m => SealedConduitT () a m () -> Sink a m b -> m (SealedConduitT () a m (), b) infixr 0 #

Continue processing after usage of $$+.

Since 0.5.0

($$+-) :: Monad m => SealedConduitT () a m () -> Sink a m b -> m b infixr 0 #

Same as $$++ and connectResume, but doesn't include the updated SealedConduitT.

NOTE In previous versions, this would cause finalizers to run. Since version 1.3.0, there are no finalizers in conduit.

Since 0.5.0

($=+) :: forall (m :: Type -> Type) a b. Monad m => SealedConduitT () a m () -> Conduit a m b -> SealedConduitT () b m () infixl 1 #

Left fusion for a sealed source.

Since 1.0.16

sequenceSources :: forall f (m :: Type -> Type) o. (Traversable f, Monad m) => f (Source m o) -> Source m (f o) #

Coalesce all values yielded by all of the Sources.

Implemented on top of ZipSource and as such, it exhibits the same short-circuiting behavior as ZipSource. See that data type for more details. If you want to create a source that yields *all* values from multiple sources, use sequence_.

Since 1.0.13

sequenceSinks :: forall f (m :: Type -> Type) i r. (Traversable f, Monad m) => f (Sink i m r) -> Sink i m (f r) #

Send incoming values to all of the Sink providing, and ultimately coalesce together all return values.

Implemented on top of ZipSink, see that data type for more details.

Since 1.0.13

(=$$+) :: forall (m :: Type -> Type) a b r. Monad m => ConduitT a b m () -> ConduitT b Void m r -> ConduitT a Void m (SealedConduitT a b m (), r) infixr 0 #

The connect-and-resume operator. This does not close the Conduit, but instead returns it to be used again. This allows a Conduit to be used incrementally in a large program, without forcing the entire program to live in the Sink monad.

Leftover data returned from the Sink will be discarded.

Mnemonic: connect + do more.

Since 1.0.17

(=$$++) :: forall (m :: Type -> Type) i o r. Monad m => SealedConduitT i o m () -> ConduitT o Void m r -> ConduitT i Void m (SealedConduitT i o m (), r) infixr 0 #

Continue processing after usage of =$$+. Connect a SealedConduitT to a sink and return the output of the sink together with a new SealedConduitT.

Since 1.0.17

(=$$+-) :: forall (m :: Type -> Type) i o r. Monad m => SealedConduitT i o m () -> ConduitT o Void m r -> ConduitT i Void m r infixr 0 #

Same as =$$++, but doesn't include the updated SealedConduitT.

NOTE In previous versions, this would cause finalizers to run. Since version 1.3.0, there are no finalizers in conduit.

Since 1.0.17

sequenceConduits :: forall f (m :: Type -> Type) i o r. (Traversable f, Monad m) => f (ConduitT i o m r) -> ConduitT i o m (f r) #

Provide identical input to all of the Conduits and combine their outputs into a single stream.

Implemented on top of ZipConduit, see that data type for more details.

Since 1.0.17

fuseBoth :: forall (m :: Type -> Type) a b r1 c r2. Monad m => ConduitT a b m r1 -> ConduitT b c m r2 -> ConduitT a c m (r1, r2) #

Fuse two ConduitTs together, and provide the return value of both. Note that this will force the entire upstream ConduitT to be run to produce the result value, even if the downstream terminates early.

Since 1.1.5

fuseBothMaybe :: forall (m :: Type -> Type) a b r1 c r2. Monad m => ConduitT a b m r1 -> ConduitT b c m r2 -> ConduitT a c m (Maybe r1, r2) #

Like fuseBoth, but does not force consumption of the Producer. In the case that the Producer terminates, the result value is provided as a Just value. If it does not terminate, then a Nothing value is returned.

One thing to note here is that "termination" here only occurs if the Producer actually yields a Nothing value. For example, with the Producer mapM_ yield [1..5], if five values are requested, the Producer has not yet terminated. Termination only occurs when the sixth value is awaited for and the Producer signals termination.

Since 1.2.4

fuseUpstream :: forall (m :: Type -> Type) a b r c. Monad m => ConduitT a b m r -> Conduit b m c -> ConduitT a c m r #

Same as fuseBoth, but ignore the return value from the downstream Conduit. Same caveats of forced consumption apply.

Since 1.1.5

runConduitPure :: ConduitT () Void Identity r -> r #

Run a pure pipeline until processing completes, i.e. a pipeline with Identity as the base monad. This is equivalient to runIdentity . runConduit.

Since: conduit-1.2.8

runConduitRes :: MonadUnliftIO m => ConduitT () Void (ResourceT m) r -> m r #

Run a pipeline which acquires resources with ResourceT, and then run the ResourceT transformer. This is equivalent to runResourceT . runConduit.

Since: conduit-1.2.8

exceptC :: forall (m :: Type -> Type) i o e a. Monad m => ConduitT i o m (Either e a) -> ConduitT i o (ExceptT e m) a #

Wrap the base monad in ExceptT

Since 1.2.12

runExceptC :: forall (m :: Type -> Type) i o e r. Monad m => ConduitT i o (ExceptT e m) r -> ConduitT i o m (Either e r) #

Run ExceptT in the base monad

Since 1.2.12

catchExceptC :: forall (m :: Type -> Type) i o e r. Monad m => ConduitT i o (ExceptT e m) r -> (e -> ConduitT i o (ExceptT e m) r) -> ConduitT i o (ExceptT e m) r #

Catch an error in the base monad

Since 1.2.12

runCatchC :: forall (m :: Type -> Type) i o r. Monad m => ConduitT i o (CatchT m) r -> ConduitT i o m (Either SomeException r) #

Run CatchT in the base monad

Since 1.1.0

catchCatchC :: forall (m :: Type -> Type) i o r. Monad m => ConduitT i o (CatchT m) r -> (SomeException -> ConduitT i o (CatchT m) r) -> ConduitT i o (CatchT m) r #

Catch an exception in the base monad

Since 1.1.0

maybeC :: forall (m :: Type -> Type) i o a. Monad m => ConduitT i o m (Maybe a) -> ConduitT i o (MaybeT m) a #

Wrap the base monad in MaybeT

Since 1.0.11

runMaybeC :: forall (m :: Type -> Type) i o r. Monad m => ConduitT i o (MaybeT m) r -> ConduitT i o m (Maybe r) #

Run MaybeT in the base monad

Since 1.0.11

readerC :: forall (m :: Type -> Type) r i o a. Monad m => (r -> ConduitT i o m a) -> ConduitT i o (ReaderT r m) a #

Wrap the base monad in ReaderT

Since 1.0.11

runReaderC :: forall (m :: Type -> Type) r i o res. Monad m => r -> ConduitT i o (ReaderT r m) res -> ConduitT i o m res #

Run ReaderT in the base monad

Since 1.0.11

stateLC :: forall (m :: Type -> Type) s i o a. Monad m => (s -> ConduitT i o m (a, s)) -> ConduitT i o (StateT s m) a #

Wrap the base monad in StateT

Since 1.0.11

runStateLC :: forall (m :: Type -> Type) s i o r. Monad m => s -> ConduitT i o (StateT s m) r -> ConduitT i o m (r, s) #

Run StateT in the base monad

Since 1.0.11

evalStateLC :: forall (m :: Type -> Type) s i o r. Monad m => s -> ConduitT i o (StateT s m) r -> ConduitT i o m r #

Evaluate StateT in the base monad

Since 1.0.11

execStateLC :: forall (m :: Type -> Type) s i o r. Monad m => s -> ConduitT i o (StateT s m) r -> ConduitT i o m s #

Execute StateT in the base monad

Since 1.0.11

stateC :: forall (m :: Type -> Type) s i o a. Monad m => (s -> ConduitT i o m (a, s)) -> ConduitT i o (StateT s m) a #

Wrap the base monad in StateT

Since 1.0.11

runStateC :: forall (m :: Type -> Type) s i o r. Monad m => s -> ConduitT i o (StateT s m) r -> ConduitT i o m (r, s) #

Run StateT in the base monad

Since 1.0.11

evalStateC :: forall (m :: Type -> Type) s i o r. Monad m => s -> ConduitT i o (StateT s m) r -> ConduitT i o m r #

Evaluate StateT in the base monad

Since 1.0.11

execStateC :: forall (m :: Type -> Type) s i o r. Monad m => s -> ConduitT i o (StateT s m) r -> ConduitT i o m s #

Execute StateT in the base monad

Since 1.0.11

writerLC :: forall (m :: Type -> Type) w i o b. (Monad m, Monoid w) => ConduitT i o m (b, w) -> ConduitT i o (WriterT w m) b #

Wrap the base monad in WriterT

Since 1.0.11

runWriterLC :: forall (m :: Type -> Type) w i o r. (Monad m, Monoid w) => ConduitT i o (WriterT w m) r -> ConduitT i o m (r, w) #

Run WriterT in the base monad

Since 1.0.11

execWriterLC :: forall (m :: Type -> Type) w i o r. (Monad m, Monoid w) => ConduitT i o (WriterT w m) r -> ConduitT i o m w #

Execute WriterT in the base monad

Since 1.0.11

writerC :: forall (m :: Type -> Type) w i o b. (Monad m, Monoid w) => ConduitT i o m (b, w) -> ConduitT i o (WriterT w m) b #

Wrap the base monad in WriterT

Since 1.0.11

runWriterC :: forall (m :: Type -> Type) w i o r. (Monad m, Monoid w) => ConduitT i o (WriterT w m) r -> ConduitT i o m (r, w) #

Run WriterT in the base monad

Since 1.0.11

execWriterC :: forall (m :: Type -> Type) w i o r. (Monad m, Monoid w) => ConduitT i o (WriterT w m) r -> ConduitT i o m w #

Execute WriterT in the base monad

Since 1.0.11

rwsLC :: forall (m :: Type -> Type) w r s i o a. (Monad m, Monoid w) => (r -> s -> ConduitT i o m (a, s, w)) -> ConduitT i o (RWST r w s m) a #

Wrap the base monad in RWST

Since 1.0.11

runRWSLC :: forall (m :: Type -> Type) w r s i o res. (Monad m, Monoid w) => r -> s -> ConduitT i o (RWST r w s m) res -> ConduitT i o m (res, s, w) #

Run RWST in the base monad

Since 1.0.11

evalRWSLC :: forall (m :: Type -> Type) w r s i o res. (Monad m, Monoid w) => r -> s -> ConduitT i o (RWST r w s m) res -> ConduitT i o m (res, w) #

Evaluate RWST in the base monad

Since 1.0.11

execRWSLC :: forall (m :: Type -> Type) w r s i o res. (Monad m, Monoid w) => r -> s -> ConduitT i o (RWST r w s m) res -> ConduitT i o m (s, w) #

Execute RWST in the base monad

Since 1.0.11

rwsC :: forall (m :: Type -> Type) w r s i o a. (Monad m, Monoid w) => (r -> s -> ConduitT i o m (a, s, w)) -> ConduitT i o (RWST r w s m) a #

Wrap the base monad in RWST

Since 1.0.11

runRWSC :: forall (m :: Type -> Type) w r s i o res. (Monad m, Monoid w) => r -> s -> ConduitT i o (RWST r w s m) res -> ConduitT i o m (res, s, w) #

Run RWST in the base monad

Since 1.0.11

evalRWSC :: forall (m :: Type -> Type) w r s i o res. (Monad m, Monoid w) => r -> s -> ConduitT i o (RWST r w s m) res -> ConduitT i o m (res, w) #

Evaluate RWST in the base monad

Since 1.0.11

execRWSC :: forall (m :: Type -> Type) w r s i o res. (Monad m, Monoid w) => r -> s -> ConduitT i o (RWST r w s m) res -> ConduitT i o m (s, w) #

Execute RWST in the base monad

Since 1.0.11

type BufferAllocStrategy = (IO Buffer, Int -> Buffer -> IO (IO Buffer)) #

A buffer allocation strategy (buf0, nextBuf) specifies the initial buffer to use and how to compute a new buffer nextBuf minSize buf with at least size minSize from a filled buffer buf. The double nesting of the IO monad helps to ensure that the reference to the filled buffer buf is lost as soon as possible, but the new buffer doesn't have to be allocated too early.

Since: conduit-1.3.0

yieldMany :: forall (m :: Type -> Type) mono i. (Monad m, MonoFoldable mono) => mono -> ConduitT i (Element mono) m () #

Yield each of the values contained by the given MonoFoldable.

This will work on many data structures, including lists, ByteStrings, and Vectors.

Subject to fusion

Since: conduit-1.3.0

sourceLazy :: forall (m :: Type -> Type) lazy strict i. (Monad m, LazySequence lazy strict) => lazy -> ConduitT i strict m () #

Generate a producer by yielding each of the strict chunks in a LazySequence.

For more information, see toChunks.

Subject to fusion

Since: conduit-1.3.0

sourceFile :: forall (m :: Type -> Type) i. MonadResource m => FilePath -> ConduitT i ByteString m () #

Stream the contents of a file as binary data.

Since: conduit-1.3.0

sourceHandle :: forall (m :: Type -> Type) i. MonadIO m => Handle -> ConduitT i ByteString m () #

Stream the contents of a Handle as binary data. Note that this function will not automatically close the Handle when processing completes, since it did not acquire the Handle in the first place.

Since: conduit-1.3.0

sourceHandleUnsafe :: forall (m :: Type -> Type) i. MonadIO m => Handle -> ConduitT i ByteString m () #

Same as sourceHandle, but instead of allocating a new buffer for each incoming chunk of data, reuses the same buffer. Therefore, the ByteStrings yielded by this function are not referentially transparent between two different yields.

This function will be slightly more efficient than sourceHandle by avoiding allocations and reducing garbage collections, but should only be used if you can guarantee that you do not reuse a ByteString (or any slice thereof) between two calls to await.

Since: conduit-1.3.0

sourceIOHandle :: forall (m :: Type -> Type) i. MonadResource m => IO Handle -> ConduitT i ByteString m () #

An alternative to sourceHandle. Instead of taking a pre-opened Handle, it takes an action that opens a Handle (in read mode), so that it can open it only when needed and close it as soon as possible.

Since: conduit-1.3.0

sourceFileBS :: forall (m :: Type -> Type) i. MonadResource m => FilePath -> ConduitT i ByteString m () #

Same as sourceFile. The alternate name is a holdover from an older version, when sourceFile was more polymorphic than it is today.

Since: conduit-1.3.0

sinkFile :: forall (m :: Type -> Type) o. MonadResource m => FilePath -> ConduitT ByteString o m () #

Stream all incoming data to the given file.

Since: conduit-1.3.0

sinkFileCautious :: forall (m :: Type -> Type) o. MonadResource m => FilePath -> ConduitM ByteString o m () #

Cautious version of sinkFile. The idea here is to stream the values to a temporary file in the same directory of the destination file, and only on successfully writing the entire file, moves it atomically to the destination path.

In the event of an exception occurring, the temporary file will be deleted and no move will be made. If the application shuts down without running exception handling (such as machine failure or a SIGKILL), the temporary file will remain and the destination file will be untouched.

Since: conduit-1.3.0

withSinkFileCautious :: forall m (n :: Type -> Type) o a. (MonadUnliftIO m, MonadIO n) => FilePath -> (ConduitM ByteString o n () -> m a) -> m a #

Like sinkFileCautious, but uses the with pattern instead of MonadResource.

Since: conduit-1.3.0

sinkTempFile #

Arguments

:: forall (m :: Type -> Type) o. MonadResource m 
=> FilePath

temp directory

-> String

filename pattern

-> ConduitM ByteString o m FilePath 

Stream data into a temporary file in the given directory with the given filename pattern, and return the temporary filename. The temporary file will be automatically deleted when exiting the active ResourceT block, if it still exists.

Since: conduit-1.3.0

sinkSystemTempFile #

Arguments

:: forall (m :: Type -> Type) o. MonadResource m 
=> String

filename pattern

-> ConduitM ByteString o m FilePath 

Same as sinkTempFile, but will use the default temp file directory for the system as the first argument.

Since: conduit-1.3.0

sinkHandle :: forall (m :: Type -> Type) o. MonadIO m => Handle -> ConduitT ByteString o m () #

Stream all incoming data to the given Handle. Note that this function does not flush and will not close the Handle when processing completes.

Since: conduit-1.3.0

sinkHandleBuilder :: forall (m :: Type -> Type) o. MonadIO m => Handle -> ConduitM Builder o m () #

Stream incoming builders, executing them directly on the buffer of the given Handle. Note that this function does not automatically close the Handle when processing completes. Pass flush to flush the buffer.

Since: conduit-1.3.0

sinkHandleFlush :: forall (m :: Type -> Type) o. MonadIO m => Handle -> ConduitM (Flush ByteString) o m () #

Stream incoming Flushes, executing them on IO.Handle Note that this function does not automatically close the Handle when processing completes

Since: conduit-1.3.0

sinkIOHandle :: forall (m :: Type -> Type) o. MonadResource m => IO Handle -> ConduitT ByteString o m () #

An alternative to sinkHandle. Instead of taking a pre-opened Handle, it takes an action that opens a Handle (in write mode), so that it can open it only when needed and close it as soon as possible.

Since: conduit-1.3.0

withSourceFile :: forall m (n :: Type -> Type) i a. (MonadUnliftIO m, MonadIO n) => FilePath -> (ConduitM i ByteString n () -> m a) -> m a #

Like withBinaryFile, but provides a source to read bytes from.

Since: conduit-1.3.0

withSinkFile :: forall m (n :: Type -> Type) o a. (MonadUnliftIO m, MonadIO n) => FilePath -> (ConduitM ByteString o n () -> m a) -> m a #

Like withBinaryFile, but provides a sink to write bytes to.

Since: conduit-1.3.0

withSinkFileBuilder :: forall m (n :: Type -> Type) o a. (MonadUnliftIO m, MonadIO n) => FilePath -> (ConduitM Builder o n () -> m a) -> m a #

Same as withSinkFile, but lets you use a Builder.

Since: conduit-1.3.0

sourceDirectory :: forall (m :: Type -> Type) i. MonadResource m => FilePath -> ConduitT i FilePath m () #

Stream the contents of the given directory, without traversing deeply.

This function will return all of the contents of the directory, whether they be files, directories, etc.

Note that the generated filepaths will be the complete path, not just the filename. In other words, if you have a directory foo containing files bar and baz, and you use sourceDirectory on foo, the results will be foo/bar and foo/baz.

Since: conduit-1.3.0

sourceDirectoryDeep #

Arguments

:: forall (m :: Type -> Type) i. MonadResource m 
=> Bool

Follow directory symlinks

-> FilePath

Root directory

-> ConduitT i FilePath m () 

Deeply stream the contents of the given directory.

This works the same as sourceDirectory, but will not return directories at all. This function also takes an extra parameter to indicate whether symlinks will be followed.

Since: conduit-1.3.0

sinkLazy :: forall (m :: Type -> Type) lazy strict o. (Monad m, LazySequence lazy strict) => ConduitT strict o m lazy #

Consume all incoming strict chunks into a lazy sequence. Note that the entirety of the sequence will be resident at memory.

This can be used to consume a stream of strict ByteStrings into a lazy ByteString, for example.

Subject to fusion

Since: conduit-1.3.0

sinkList :: forall (m :: Type -> Type) a o. Monad m => ConduitT a o m [a] #

Consume all values from the stream and return as a list. Note that this will pull all values into memory.

Subject to fusion

Since: conduit-1.3.0

sinkVector :: forall v a (m :: Type -> Type) o. (Vector v a, PrimMonad m) => ConduitT a o m (v a) #

Sink incoming values into a vector, growing the vector as necessary to fit more elements.

Note that using this function is more memory efficient than sinkList and then converting to a Vector, as it avoids intermediate list constructors.

Subject to fusion

Since: conduit-1.3.0

sinkVectorN #

Arguments

:: forall v a (m :: Type -> Type) o. (Vector v a, PrimMonad m) 
=> Int

maximum allowed size

-> ConduitT a o m (v a) 

Sink incoming values into a vector, up until size maxSize. Subsequent values will be left in the stream. If there are less than maxSize values present, returns a Vector of smaller size.

Note that using this function is more memory efficient than sinkList and then converting to a Vector, as it avoids intermediate list constructors.

Subject to fusion

Since: conduit-1.3.0

sinkLazyBuilder :: forall (m :: Type -> Type) o. Monad m => ConduitT Builder o m ByteString #

Same as sinkBuilder, but afterwards convert the builder to its lazy representation.

Alternatively, this could be considered an alternative to sinkLazy, with the following differences:

  • This function will allow multiple input types, not just the strict version of the lazy structure.
  • Some buffer copying may occur in this version.

Subject to fusion

Since: conduit-1.3.0

sinkNull :: forall (m :: Type -> Type) a o. Monad m => ConduitT a o m () #

Consume and discard all remaining values in the stream.

Subject to fusion

Since: conduit-1.3.0

awaitNonNull :: forall (m :: Type -> Type) a o. (Monad m, MonoFoldable a) => ConduitT a o m (Maybe (NonNull a)) #

Same as await, but discards any leading onull values.

Since: conduit-1.3.0

sinkFileBS :: forall (m :: Type -> Type) o. MonadResource m => FilePath -> ConduitT ByteString o m () #

sinkFile specialized to ByteString to help with type inference.

Since: conduit-1.3.0

builderToByteString :: forall (m :: Type -> Type). PrimMonad m => ConduitT Builder ByteString m () #

Incrementally execute builders and pass on the filled chunks as bytestrings.

Since: conduit-1.3.0

builderToByteStringFlush :: forall (m :: Type -> Type). PrimMonad m => ConduitT (Flush Builder) (Flush ByteString) m () #

Same as builderToByteString, but input and output are wrapped in Flush.

Since: conduit-1.3.0

unsafeBuilderToByteString :: forall (m :: Type -> Type). PrimMonad m => ConduitT Builder ByteString m () #

Incrementally execute builders on the given buffer and pass on the filled chunks as bytestrings. Note that, if the given buffer is too small for the execution of a build step, a larger one will be allocated.

WARNING: This conduit yields bytestrings that are NOT referentially transparent. Their content will be overwritten as soon as control is returned from the inner sink!

Since: conduit-1.3.0

builderToByteStringWith :: forall (m :: Type -> Type). PrimMonad m => BufferAllocStrategy -> ConduitT Builder ByteString m () #

A conduit that incrementally executes builders and passes on the filled chunks as bytestrings to an inner sink.

INV: All bytestrings passed to the inner sink are non-empty.

Since: conduit-1.3.0

builderToByteStringWithFlush :: forall (m :: Type -> Type). PrimMonad m => BufferAllocStrategy -> ConduitT (Flush Builder) (Flush ByteString) m () #

Since: conduit-1.3.0

allNewBuffersStrategy :: Int -> BufferAllocStrategy #

The simplest buffer allocation strategy: whenever a buffer is requested, allocate a new one that is big enough for the next build step to execute.

NOTE that this allocation strategy may spill quite some memory upon direct insertion of a bytestring by the builder. Thats no problem for garbage collection, but it may lead to unreasonably high memory consumption in special circumstances.

Since: conduit-1.3.0

reuseBufferStrategy :: IO Buffer -> BufferAllocStrategy #

An unsafe, but possibly more efficient buffer allocation strategy: reuse the buffer, if it is big enough for the next build step to execute.

Since: conduit-1.3.0

mapAccumS :: forall (m :: Type -> Type) a s b. Monad m => (a -> s -> ConduitT b Void m s) -> s -> ConduitT () b m () -> ConduitT a Void m s #

Consume a source with a strict accumulator, in a way piecewise defined by a controlling stream. The latter will be evaluated until it terminates.

>>> let f a s = liftM (:s) $ mapC (*a) =$ CL.take a
>>> reverse $ runIdentity $ yieldMany [0..3] $$ mapAccumS f [] (yieldMany [1..])
[[],[1],[4,6],[12,15,18]] :: [[Int]]

peekForever :: forall (m :: Type -> Type) i o. Monad m => ConduitT i o m () -> ConduitT i o m () #

Run a consuming conduit repeatedly, only stopping when there is no more data available from upstream.

Since: conduit-1.3.0

peekForeverE :: forall (m :: Type -> Type) i o. (Monad m, MonoFoldable i) => ConduitT i o m () -> ConduitT i o m () #

Run a consuming conduit repeatedly, only stopping when there is no more data available from upstream.

In contrast to peekForever, this function will ignore empty chunks of data. So for example, if a stream of data contains an empty ByteString, it is still treated as empty, and the consuming function is not called.

Since: conduit-1.3.0

unfoldC :: forall (m :: Type -> Type) b a i. Monad m => (b -> Maybe (a, b)) -> b -> ConduitT i a m () #

Generate a producer from a seed value.

Since: conduit-1.3.0

enumFromToC :: forall (m :: Type -> Type) a i. (Monad m, Enum a, Ord a) => a -> a -> ConduitT i a m () #

Enumerate from a value to a final value, inclusive, via succ.

This is generally more efficient than using Prelude's enumFromTo and combining with sourceList since this avoids any intermediate data structures.

Since: conduit-1.3.0

iterateC :: forall (m :: Type -> Type) a i. Monad m => (a -> a) -> a -> ConduitT i a m () #

Produces an infinite stream of repeated applications of f to x.

Since: conduit-1.3.0

repeatC :: forall (m :: Type -> Type) a i. Monad m => a -> ConduitT i a m () #

Produce an infinite stream consisting entirely of the given value.

Since: conduit-1.3.0

replicateC :: forall (m :: Type -> Type) a i. Monad m => Int -> a -> ConduitT i a m () #

Produce a finite stream consisting of n copies of the given value.

Since: conduit-1.3.0

repeatMC :: Monad m => m a -> ConduitT i a m () #

Repeatedly run the given action and yield all values it produces.

Since: conduit-1.3.0

repeatWhileMC :: Monad m => m a -> (a -> Bool) -> ConduitT i a m () #

Repeatedly run the given action and yield all values it produces, until the provided predicate returns False.

Since: conduit-1.3.0

replicateMC :: Monad m => Int -> m a -> ConduitT i a m () #

Perform the given action n times, yielding each result.

Since: conduit-1.3.0

stdinC :: forall (m :: Type -> Type) i. MonadIO m => ConduitT i ByteString m () #

sourceHandle applied to stdin.

Since: conduit-1.3.0

dropC :: forall (m :: Type -> Type) a o. Monad m => Int -> ConduitT a o m () #

Ignore a certain number of values in the stream.

Note: since this function doesn't produce anything, you probably want to use it with (>>) instead of directly plugging it into a pipeline:

>>> runConduit $ yieldMany [1..5] .| dropC 2 .| sinkList
[]
>>> runConduit $ yieldMany [1..5] .| (dropC 2 >> sinkList)
[3,4,5]

Since: conduit-1.3.0

dropCE :: forall (m :: Type -> Type) seq o. (Monad m, IsSequence seq) => Index seq -> ConduitT seq o m () #

Drop a certain number of elements from a chunked stream.

Note: you likely want to use it with monadic composition. See the docs for dropC.

Since: conduit-1.3.0

dropWhileC :: forall (m :: Type -> Type) a o. Monad m => (a -> Bool) -> ConduitT a o m () #

Drop all values which match the given predicate.

Note: you likely want to use it with monadic composition. See the docs for dropC.

Since: conduit-1.3.0

dropWhileCE :: forall (m :: Type -> Type) seq o. (Monad m, IsSequence seq) => (Element seq -> Bool) -> ConduitT seq o m () #

Drop all elements in the chunked stream which match the given predicate.

Note: you likely want to use it with monadic composition. See the docs for dropC.

Since: conduit-1.3.0

foldC :: forall (m :: Type -> Type) a o. (Monad m, Monoid a) => ConduitT a o m a #

Monoidally combine all values in the stream.

Since: conduit-1.3.0

foldCE :: forall (m :: Type -> Type) mono o. (Monad m, MonoFoldable mono, Monoid (Element mono)) => ConduitT mono o m (Element mono) #

Monoidally combine all elements in the chunked stream.

Since: conduit-1.3.0

foldlC :: forall (m :: Type -> Type) a b o. Monad m => (a -> b -> a) -> a -> ConduitT b o m a #

A strict left fold.

Since: conduit-1.3.0

foldlCE :: forall (m :: Type -> Type) mono a o. (Monad m, MonoFoldable mono) => (a -> Element mono -> a) -> a -> ConduitT mono o m a #

A strict left fold on a chunked stream.

Since: conduit-1.3.0

foldMapC :: forall (m :: Type -> Type) b a o. (Monad m, Monoid b) => (a -> b) -> ConduitT a o m b #

Apply the provided mapping function and monoidal combine all values.

Since: conduit-1.3.0

foldMapCE :: forall (m :: Type -> Type) mono w o. (Monad m, MonoFoldable mono, Monoid w) => (Element mono -> w) -> ConduitT mono o m w #

Apply the provided mapping function and monoidal combine all elements of the chunked stream.

Since: conduit-1.3.0

allC :: forall (m :: Type -> Type) a o. Monad m => (a -> Bool) -> ConduitT a o m Bool #

Check that all values in the stream return True.

Subject to shortcut logic: at the first False, consumption of the stream will stop.

Since: conduit-1.3.0

allCE :: forall (m :: Type -> Type) mono o. (Monad m, MonoFoldable mono) => (Element mono -> Bool) -> ConduitT mono o m Bool #

Check that all elements in the chunked stream return True.

Subject to shortcut logic: at the first False, consumption of the stream will stop.

Since: conduit-1.3.0

anyC :: forall (m :: Type -> Type) a o. Monad m => (a -> Bool) -> ConduitT a o m Bool #

Check that at least one value in the stream returns True.

Subject to shortcut logic: at the first True, consumption of the stream will stop.

Since: conduit-1.3.0

anyCE :: forall (m :: Type -> Type) mono o. (Monad m, MonoFoldable mono) => (Element mono -> Bool) -> ConduitT mono o m Bool #

Check that at least one element in the chunked stream returns True.

Subject to shortcut logic: at the first True, consumption of the stream will stop.

Since: conduit-1.3.0

andC :: forall (m :: Type -> Type) o. Monad m => ConduitT Bool o m Bool #

Are all values in the stream True?

Consumption stops once the first False is encountered.

Since: conduit-1.3.0

andCE :: forall (m :: Type -> Type) mono o. (Monad m, MonoFoldable mono, Element mono ~ Bool) => ConduitT mono o m Bool #

Are all elements in the chunked stream True?

Consumption stops once the first False is encountered.

Since: conduit-1.3.0

orC :: forall (m :: Type -> Type) o. Monad m => ConduitT Bool o m Bool #

Are any values in the stream True?

Consumption stops once the first True is encountered.

Since: conduit-1.3.0

orCE :: forall (m :: Type -> Type) mono o. (Monad m, MonoFoldable mono, Element mono ~ Bool) => ConduitT mono o m Bool #

Are any elements in the chunked stream True?

Consumption stops once the first True is encountered.

Since: conduit-1.3.0

asumC :: forall (m :: Type -> Type) f a o. (Monad m, Alternative f) => ConduitT (f a) o m (f a) #

Alternatively combine all values in the stream.

Since: conduit-1.3.0

elemC :: forall (m :: Type -> Type) a o. (Monad m, Eq a) => a -> ConduitT a o m Bool #

Are any values in the stream equal to the given value?

Stops consuming as soon as a match is found.

Since: conduit-1.3.0

elemCE :: forall (m :: Type -> Type) seq o. (Monad m, IsSequence seq, Eq (Element seq)) => Element seq -> ConduitT seq o m Bool #

Are any elements in the chunked stream equal to the given element?

Stops consuming as soon as a match is found.

Since: conduit-1.3.0

notElemC :: forall (m :: Type -> Type) a o. (Monad m, Eq a) => a -> ConduitT a o m Bool #

Are no values in the stream equal to the given value?

Stops consuming as soon as a match is found.

Since: conduit-1.3.0

notElemCE :: forall (m :: Type -> Type) seq o. (Monad m, IsSequence seq, Eq (Element seq)) => Element seq -> ConduitT seq o m Bool #

Are no elements in the chunked stream equal to the given element?

Stops consuming as soon as a match is found.

Since: conduit-1.3.0

headC :: forall (m :: Type -> Type) a o. Monad m => ConduitT a o m (Maybe a) #

Take a single value from the stream, if available.

Since: conduit-1.3.0

headDefC :: forall (m :: Type -> Type) a o. Monad m => a -> ConduitT a o m a #

Same as headC, but returns a default value if none are available from the stream.

Since: conduit-1.3.0

headCE :: forall (m :: Type -> Type) seq o. (Monad m, IsSequence seq) => ConduitT seq o m (Maybe (Element seq)) #

Get the next element in the chunked stream.

Since: conduit-1.3.0

peekC :: forall (m :: Type -> Type) a o. Monad m => ConduitT a o m (Maybe a) #

View the next value in the stream without consuming it.

Since: conduit-1.3.0

peekCE :: forall (m :: Type -> Type) mono o. (Monad m, MonoFoldable mono) => ConduitT mono o m (Maybe (Element mono)) #

View the next element in the chunked stream without consuming it.

Since: conduit-1.3.0

lastC :: forall (m :: Type -> Type) a o. Monad m => ConduitT a o m (Maybe a) #

Retrieve the last value in the stream, if present.

Since: conduit-1.3.0

lastDefC :: forall (m :: Type -> Type) a o. Monad m => a -> ConduitT a o m a #

Same as lastC, but returns a default value if none are available from the stream.

Since: conduit-1.3.0

lastCE :: forall (m :: Type -> Type) seq o. (Monad m, IsSequence seq) => ConduitT seq o m (Maybe (Element seq)) #

Retrieve the last element in the chunked stream, if present.

Since: conduit-1.3.0

lengthC :: forall (m :: Type -> Type) len a o. (Monad m, Num len) => ConduitT a o m len #

Count how many values are in the stream.

Since: conduit-1.3.0

lengthCE :: forall (m :: Type -> Type) len mono o. (Monad m, Num len, MonoFoldable mono) => ConduitT mono o m len #

Count how many elements are in the chunked stream.

Since: conduit-1.3.0

lengthIfC :: forall (m :: Type -> Type) len a o. (Monad m, Num len) => (a -> Bool) -> ConduitT a o m len #

Count how many values in the stream pass the given predicate.

Since: conduit-1.3.0

lengthIfCE :: forall (m :: Type -> Type) len mono o. (Monad m, Num len, MonoFoldable mono) => (Element mono -> Bool) -> ConduitT mono o m len #

Count how many elements in the chunked stream pass the given predicate.

Since: conduit-1.3.0

maximumC :: forall (m :: Type -> Type) a o. (Monad m, Ord a) => ConduitT a o m (Maybe a) #

Get the largest value in the stream, if present.

Since: conduit-1.3.0

maximumCE :: forall (m :: Type -> Type) seq o. (Monad m, IsSequence seq, Ord (Element seq)) => ConduitT seq o m (Maybe (Element seq)) #

Get the largest element in the chunked stream, if present.

Since: conduit-1.3.0

minimumC :: forall (m :: Type -> Type) a o. (Monad m, Ord a) => ConduitT a o m (Maybe a) #

Get the smallest value in the stream, if present.

Since: conduit-1.3.0

minimumCE :: forall (m :: Type -> Type) seq o. (Monad m, IsSequence seq, Ord (Element seq)) => ConduitT seq o m (Maybe (Element seq)) #

Get the smallest element in the chunked stream, if present.

Since: conduit-1.3.0

nullC :: forall (m :: Type -> Type) a o. Monad m => ConduitT a o m Bool #

True if there are no values in the stream.

This function does not modify the stream.

Since: conduit-1.3.0

nullCE :: forall (m :: Type -> Type) mono o. (Monad m, MonoFoldable mono) => ConduitT mono o m Bool #

True if there are no elements in the chunked stream.

This function may remove empty leading chunks from the stream, but otherwise will not modify it.

Since: conduit-1.3.0

sumC :: forall (m :: Type -> Type) a o. (Monad m, Num a) => ConduitT a o m a #

Get the sum of all values in the stream.

Since: conduit-1.3.0

sumCE :: forall (m :: Type -> Type) mono o. (Monad m, MonoFoldable mono, Num (Element mono)) => ConduitT mono o m (Element mono) #

Get the sum of all elements in the chunked stream.

Since: conduit-1.3.0

productC :: forall (m :: Type -> Type) a o. (Monad m, Num a) => ConduitT a o m a #

Get the product of all values in the stream.

Since: conduit-1.3.0

productCE :: forall (m :: Type -> Type) mono o. (Monad m, MonoFoldable mono, Num (Element mono)) => ConduitT mono o m (Element mono) #

Get the product of all elements in the chunked stream.

Since: conduit-1.3.0

findC :: forall (m :: Type -> Type) a o. Monad m => (a -> Bool) -> ConduitT a o m (Maybe a) #

Find the first matching value.

Since: conduit-1.3.0

mapM_C :: Monad m => (a -> m ()) -> ConduitT a o m () #

Apply the action to all values in the stream.

Note: if you want to pass the values instead of consuming them, use iterM instead.

Since: conduit-1.3.0

mapM_CE :: (Monad m, MonoFoldable mono) => (Element mono -> m ()) -> ConduitT mono o m () #

Apply the action to all elements in the chunked stream.

Note: the same caveat as with mapM_C applies. If you don't want to consume the values, you can use iterM:

iterM (omapM_ f)

Since: conduit-1.3.0

foldMC :: Monad m => (a -> b -> m a) -> a -> ConduitT b o m a #

A monadic strict left fold.

Since: conduit-1.3.0

foldMCE :: (Monad m, MonoFoldable mono) => (a -> Element mono -> m a) -> a -> ConduitT mono o m a #

A monadic strict left fold on a chunked stream.

Since: conduit-1.3.0

foldMapMC :: (Monad m, Monoid w) => (a -> m w) -> ConduitT a o m w #

Apply the provided monadic mapping function and monoidal combine all values.

Since: conduit-1.3.0

foldMapMCE :: (Monad m, MonoFoldable mono, Monoid w) => (Element mono -> m w) -> ConduitT mono o m w #

Apply the provided monadic mapping function and monoidal combine all elements in the chunked stream.

Since: conduit-1.3.0

printC :: forall a (m :: Type -> Type) o. (Show a, MonadIO m) => ConduitT a o m () #

Print all incoming values to stdout.

Since: conduit-1.3.0

stdoutC :: forall (m :: Type -> Type) o. MonadIO m => ConduitT ByteString o m () #

sinkHandle applied to stdout.

Since: conduit-1.3.0

stderrC :: forall (m :: Type -> Type) o. MonadIO m => ConduitT ByteString o m () #

sinkHandle applied to stderr.

Since: conduit-1.3.0

mapC :: forall (m :: Type -> Type) a b. Monad m => (a -> b) -> ConduitT a b m () #

Apply a transformation to all values in a stream.

Since: conduit-1.3.0

mapCE :: forall (m :: Type -> Type) f a b. (Monad m, Functor f) => (a -> b) -> ConduitT (f a) (f b) m () #

Apply a transformation to all elements in a chunked stream.

Since: conduit-1.3.0

omapCE :: forall (m :: Type -> Type) mono. (Monad m, MonoFunctor mono) => (Element mono -> Element mono) -> ConduitT mono mono m () #

Apply a monomorphic transformation to all elements in a chunked stream.

Unlike mapE, this will work on types like ByteString and Text which are MonoFunctor but not Functor.

Since: conduit-1.3.0

concatMapC :: forall (m :: Type -> Type) mono a. (Monad m, MonoFoldable mono) => (a -> mono) -> ConduitT a (Element mono) m () #

Apply the function to each value in the stream, resulting in a foldable value (e.g., a list). Then yield each of the individual values in that foldable value separately.

Generalizes concatMap, mapMaybe, and mapFoldable.

Since: conduit-1.3.0

concatMapCE :: forall (m :: Type -> Type) mono w. (Monad m, MonoFoldable mono, Monoid w) => (Element mono -> w) -> ConduitT mono w m () #

Apply the function to each element in the chunked stream, resulting in a foldable value (e.g., a list). Then yield each of the individual values in that foldable value separately.

Generalizes concatMap, mapMaybe, and mapFoldable.

Since: conduit-1.3.0

takeC :: forall (m :: Type -> Type) a. Monad m => Int -> ConduitT a a m () #

Stream up to n number of values downstream.

Note that, if downstream terminates early, not all values will be consumed. If you want to force exactly the given number of values to be consumed, see takeExactly.

Since: conduit-1.3.0

takeCE :: forall (m :: Type -> Type) seq. (Monad m, IsSequence seq) => Index seq -> ConduitT seq seq m () #

Stream up to n number of elements downstream in a chunked stream.

Note that, if downstream terminates early, not all values will be consumed. If you want to force exactly the given number of values to be consumed, see takeExactlyE.

Since: conduit-1.3.0

takeWhileC :: forall (m :: Type -> Type) a. Monad m => (a -> Bool) -> ConduitT a a m () #

Stream all values downstream that match the given predicate.

Same caveats regarding downstream termination apply as with take.

Since: conduit-1.3.0

takeWhileCE :: forall (m :: Type -> Type) seq. (Monad m, IsSequence seq) => (Element seq -> Bool) -> ConduitT seq seq m () #

Stream all elements downstream that match the given predicate in a chunked stream.

Same caveats regarding downstream termination apply as with takeE.

Since: conduit-1.3.0

takeExactlyC :: forall (m :: Type -> Type) a b r. Monad m => Int -> ConduitT a b m r -> ConduitT a b m r #

Consume precisely the given number of values and feed them downstream.

This function is in contrast to take, which will only consume up to the given number of values, and will terminate early if downstream terminates early. This function will discard any additional values in the stream if they are unconsumed.

Note that this function takes a downstream ConduitT as a parameter, as opposed to working with normal fusion. For more information, see http://www.yesodweb.com/blog/2013/10/core-flaw-pipes-conduit, the section titled "pipes and conduit: isolate".

Since: conduit-1.3.0

takeExactlyCE :: forall (m :: Type -> Type) a b r. (Monad m, IsSequence a) => Index a -> ConduitT a b m r -> ConduitT a b m r #

Same as takeExactly, but for chunked streams.

Since: conduit-1.3.0

concatC :: forall (m :: Type -> Type) mono. (Monad m, MonoFoldable mono) => ConduitT mono (Element mono) m () #

Flatten out a stream by yielding the values contained in an incoming MonoFoldable as individually yielded values.

Since: conduit-1.3.0

filterC :: forall (m :: Type -> Type) a. Monad m => (a -> Bool) -> ConduitT a a m () #

Keep only values in the stream passing a given predicate.

Since: conduit-1.3.0

filterCE :: forall seq (m :: Type -> Type). (IsSequence seq, Monad m) => (Element seq -> Bool) -> ConduitT seq seq m () #

Keep only elements in the chunked stream passing a given predicate.

Since: conduit-1.3.0

mapWhileC :: forall (m :: Type -> Type) a b. Monad m => (a -> Maybe b) -> ConduitT a b m () #

Map values as long as the result is Just.

Since: conduit-1.3.0

conduitVector #

Arguments

:: forall v a (m :: Type -> Type). (Vector v a, PrimMonad m) 
=> Int

maximum allowed size

-> ConduitT a (v a) m () 

Break up a stream of values into vectors of size n. The final vector may be smaller than n if the total number of values is not a strict multiple of n. No empty vectors will be yielded.

Since: conduit-1.3.0

scanlC :: forall (m :: Type -> Type) a b. Monad m => (a -> b -> a) -> a -> ConduitT b a m () #

Analog of scanl for lists.

Since: conduit-1.3.0

mapAccumWhileC :: forall (m :: Type -> Type) a s b. Monad m => (a -> s -> Either s (s, b)) -> s -> ConduitT a b m s #

mapWhileC with a break condition dependent on a strict accumulator. Equivalently, mapAccum as long as the result is Right. Instead of producing a leftover, the breaking input determines the resulting accumulator via Left.

concatMapAccumC :: forall (m :: Type -> Type) a accum b. Monad m => (a -> accum -> (accum, [b])) -> accum -> ConduitT a b m () #

concatMap with an accumulator.

Since: conduit-1.3.0

intersperseC :: forall (m :: Type -> Type) a. Monad m => a -> ConduitT a a m () #

Insert the given value between each two values in the stream.

Since: conduit-1.3.0

slidingWindowC :: forall (m :: Type -> Type) seq a. (Monad m, IsSequence seq, Element seq ~ a) => Int -> ConduitT a seq m () #

Sliding window of values 1,2,3,4,5 with window size 2 gives [1,2],[2,3],[3,4],[4,5]

Best used with structures that support O(1) snoc.

Since: conduit-1.3.0

chunksOfCE :: forall (m :: Type -> Type) seq. (Monad m, IsSequence seq) => Index seq -> ConduitT seq seq m () #

Split input into chunk of size chunkSize

The last element may be smaller than the chunkSize (see also chunksOfExactlyE which will not yield this last element)

Since: conduit-1.3.0

chunksOfExactlyCE :: forall (m :: Type -> Type) seq. (Monad m, IsSequence seq) => Index seq -> ConduitT seq seq m () #

Split input into chunk of size chunkSize

If the input does not split into chunks exactly, the remainder will be leftover (see also chunksOfE)

Since: conduit-1.3.0

mapMC :: Monad m => (a -> m b) -> ConduitT a b m () #

Apply a monadic transformation to all values in a stream.

If you do not need the transformed values, and instead just want the monadic side-effects of running the action, see mapM_.

Since: conduit-1.3.0

mapMCE :: (Monad m, Traversable f) => (a -> m b) -> ConduitT (f a) (f b) m () #

Apply a monadic transformation to all elements in a chunked stream.

Since: conduit-1.3.0

omapMCE :: (Monad m, MonoTraversable mono) => (Element mono -> m (Element mono)) -> ConduitT mono mono m () #

Apply a monadic monomorphic transformation to all elements in a chunked stream.

Unlike mapME, this will work on types like ByteString and Text which are MonoFunctor but not Functor.

Since: conduit-1.3.0

concatMapMC :: (Monad m, MonoFoldable mono) => (a -> m mono) -> ConduitT a (Element mono) m () #

Apply the monadic function to each value in the stream, resulting in a foldable value (e.g., a list). Then yield each of the individual values in that foldable value separately.

Generalizes concatMapM, mapMaybeM, and mapFoldableM.

Since: conduit-1.3.0

filterMC :: Monad m => (a -> m Bool) -> ConduitT a a m () #

Keep only values in the stream passing a given monadic predicate.

Since: conduit-1.3.0

filterMCE :: (Monad m, IsSequence seq) => (Element seq -> m Bool) -> ConduitT seq seq m () #

Keep only elements in the chunked stream passing a given monadic predicate.

Since: conduit-1.3.0

iterMC :: Monad m => (a -> m ()) -> ConduitT a a m () #

Apply a monadic action on all values in a stream.

This Conduit can be used to perform a monadic side-effect for every value, whilst passing the value through the Conduit as-is.

iterM f = mapM (\a -> f a >>= \() -> return a)

Since: conduit-1.3.0

scanlMC :: Monad m => (a -> b -> m a) -> a -> ConduitT b a m () #

Analog of scanl for lists, monadic.

Since: conduit-1.3.0

mapAccumWhileMC :: Monad m => (a -> s -> m (Either s (s, b))) -> s -> ConduitT a b m s #

concatMapAccumMC :: Monad m => (a -> accum -> m (accum, [b])) -> accum -> ConduitT a b m () #

concatMapM with an accumulator.

Since: conduit-1.3.0

encodeUtf8C :: forall (m :: Type -> Type) text binary. (Monad m, Utf8 text binary) => ConduitT text binary m () #

Encode a stream of text as UTF8.

Since: conduit-1.3.0

decodeUtf8C :: forall (m :: Type -> Type). MonadThrow m => ConduitT ByteString Text m () #

Decode a stream of binary data as UTF8.

Since: conduit-1.3.0

decodeUtf8LenientC :: forall (m :: Type -> Type). Monad m => ConduitT ByteString Text m () #

Decode a stream of binary data as UTF8, replacing any invalid bytes with the Unicode replacement character.

Since: conduit-1.3.0

lineC :: forall (m :: Type -> Type) seq o r. (Monad m, IsSequence seq, Element seq ~ Char) => ConduitT seq o m r -> ConduitT seq o m r #

Stream in the entirety of a single line.

Like takeExactly, this will consume the entirety of the line regardless of the behavior of the inner Conduit.

Since: conduit-1.3.0

lineAsciiC :: forall (m :: Type -> Type) seq o r. (Monad m, IsSequence seq, Element seq ~ Word8) => ConduitT seq o m r -> ConduitT seq o m r #

Same as line, but operates on ASCII/binary data.

Since: conduit-1.3.0

unlinesC :: forall (m :: Type -> Type) seq. (Monad m, IsSequence seq, Element seq ~ Char) => ConduitT seq seq m () #

Insert a newline character after each incoming chunk of data.

Since: conduit-1.3.0

unlinesAsciiC :: forall (m :: Type -> Type) seq. (Monad m, IsSequence seq, Element seq ~ Word8) => ConduitT seq seq m () #

Same as unlines, but operates on ASCII/binary data.

Since: conduit-1.3.0

linesUnboundedC :: forall (m :: Type -> Type) seq. (Monad m, IsSequence seq, Element seq ~ Char) => ConduitT seq seq m () #

Convert a stream of arbitrarily-chunked textual data into a stream of data where each chunk represents a single line. Note that, if you have unknownuntrusted input, this function is unsafe/, since it would allow an attacker to form lines of massive length and exhaust memory.

Since: conduit-1.3.0

linesUnboundedAsciiC :: forall (m :: Type -> Type) seq. (Monad m, IsSequence seq, Element seq ~ Word8) => ConduitT seq seq m () #

Same as linesUnbounded, but for ASCII/binary data.

Since: conduit-1.3.0

vectorBuilderC #

Arguments

:: forall (m :: Type -> Type) v e n i r. (PrimMonad m, Vector v e, PrimMonad n, PrimState m ~ PrimState n) 
=> Int

size

-> ((e -> n ()) -> ConduitT i Void m r) 
-> ConduitT i (v e) m r 

Generally speaking, yielding values from inside a Conduit requires some allocation for constructors. This can introduce an overhead, similar to the overhead needed to represent a list of values instead of a vector. This overhead is even more severe when talking about unboxed values.

This combinator allows you to overcome this overhead, and efficiently fill up vectors. It takes two parameters. The first is the size of each mutable vector to be allocated. The second is a function. The function takes an argument which will yield the next value into a mutable vector.

Under the surface, this function uses a number of tricks to get high performance. For more information on both usage and implementation, please see: https://www.fpcomplete.com/user/snoyberg/library-documentation/vectorbuilder

Since: conduit-1.3.0

data CombineSettings #

Data type for holding all settings for combining files.

This data type is a settings type. For more information, see:

http://www.yesodweb.com/book/settings-types

Since 1.2.0

Instances

Instances details
Default CombineSettings 
Instance details

Defined in Yesod.Static

newtype Static #

Type used for the subsite with static contents.

Constructors

Static StaticSettings 

Instances

Instances details
ParseRoute Static 
Instance details

Defined in Yesod.Static

Methods

parseRoute :: ([Text], [(Text, Text)]) -> Maybe (Route Static) #

RenderRoute Static 
Instance details

Defined in Yesod.Static

Associated Types

data Route Static #

Methods

renderRoute :: Route Static -> ([Text], [(Text, Text)]) #

YesodSubDispatch Static master 
Instance details

Defined in Yesod.Static

Read (Route Static) 
Instance details

Defined in Yesod.Static

Show (Route Static) 
Instance details

Defined in Yesod.Static

Eq (Route Static) 
Instance details

Defined in Yesod.Static

data Route Static 
Instance details

Defined in Yesod.Static

static :: FilePath -> IO Static #

Produce a default value of Static for a given file folder.

Does not have index files or directory listings. The static files' contents must not change, however new files can be added.

staticDevel :: FilePath -> IO Static #

Same as static, but does not assumes that the files do not change and checks their modification time whenever a request is made.

embed :: FilePath -> Q Exp #

Produce a Static based on embedding all of the static files' contents in the executable at compile time.

You should use Yesod.EmbeddedStatic instead, it is much more powerful.

Nota Bene: if you replace the scaffolded static call in Settings/StaticFiles.hs you will need to change the scaffolded addStaticContent. Otherwise, some of your assets will be 404'ed. This is because by default yesod will generate compile those assets to static/tmp which for static is fine since they are served out of the directory itself. With embedded static, that will not work. You can easily change addStaticContent to _ _ _ -> return Nothing as a workaround. This will cause yesod to embed those assets into the generated HTML file itself.

staticFiles :: FilePath -> Q [Dec] #

Template Haskell function that automatically creates routes for all of your static files.

For example, if you used

staticFiles "static/"

and you had files "static/style.css" and "static/js/script.js", then the following top-level definitions would be created:

style_css    = StaticRoute ["style.css"]    []
js_script_js = StaticRoute ["js", "script.js"] []

Note that dots (.), dashes (-) and slashes (/) are replaced by underscores (_) to create valid Haskell identifiers.

staticFilesList :: FilePath -> [FilePath] -> Q [Dec] #

Same as staticFiles, but takes an explicit list of files to create identifiers for. The files path given are relative to the static folder. For example, to create routes for the files "static/js/jquery.js" and "static/css/normalize.css", you would use:

staticFilesList "static" ["js/jquery.js", "css/normalize.css"]

This can be useful when you have a very large number of static files, but only need to refer to a few of them from Haskell.

publicFiles :: FilePath -> Q [Dec] #

Same as staticFiles, but doesn't append an ETag to the query string.

Using publicFiles will speed up the compilation, since there won't be any need for hashing files during compile-time. However, since the ETag ceases to be part of the URL, the Static subsite won't be able to set the expire date too far on the future. Browsers still will be able to cache the contents, however they'll need send a request to the server to see if their copy is up-to-date.

staticFilesMap :: FilePath -> Map FilePath FilePath -> Q [Dec] #

Similar to staticFilesList, but takes a mapping of unmunged names to fingerprinted file names.

Since: yesod-static-1.5.3

staticFilesMergeMap :: FilePath -> Map FilePath FilePath -> Q [Dec] #

Similar to staticFilesMergeMap, but also generates identifiers for all files in the specified directory that don't have a fingerprinted version.

Since: yesod-static-1.5.3

combineStylesheets' #

Arguments

:: Bool

development? if so, perform no combining

-> CombineSettings 
-> Name

Static route constructor name, e.g. 'StaticR

-> [Route Static]

files to combine

-> Q Exp 

Combine multiple CSS files together. Common usage would be:

>>> combineStylesheets' development def 'StaticR [style1_css, style2_css]

Where development is a variable in your site indicated whether you are in development or production mode.

Since 1.2.0

combineScripts' #

Arguments

:: Bool

development? if so, perform no combining

-> CombineSettings 
-> Name

Static route constructor name, e.g. 'StaticR

-> [Route Static]

files to combine

-> Q Exp 

Combine multiple JS files together. Common usage would be:

>>> combineScripts' development def 'StaticR [script1_js, script2_js]

Where development is a variable in your site indicated whether you are in development or production mode.

Since 1.2.0

data FeedEntry url #

Each feed entry

Constructors

FeedEntry 

Fields

data EntryCategory #

RSS 2.0 and Atom allow category in a feed entry.

RSS feeds ignore categoryLabel

Since: yesod-newsfeed-1.7

Constructors

EntryCategory 

Fields

data EntryEnclosure url #

RSS and Atom allow for linked content to be enclosed in a feed entry. This represents the enclosed content.

Atom feeds ignore enclosedSize and enclosedMimeType.

Since: yesod-newsfeed-1.6

Constructors

EntryEnclosure 

Fields

data Feed url #

The overall feed

Constructors

Feed 

Fields

newsFeedText :: MonadHandler m => Feed Text -> m TypedContent #

Same as newsFeed but for 'Feed Text'. Useful for cases where you are generating a feed of external links.

maybeAuthorized #

Arguments

:: Yesod site 
=> Route site 
-> Bool

is this a write request?

-> HandlerT site IO (Maybe (Route site)) 

Return the same URL if the user is authorized to see it.

Built on top of isAuthorized. This is useful for building page that only contain links to pages the user is allowed to see.

unauthorizedI :: (MonadHandler m, RenderMessage (HandlerSite m) msg) => msg -> m AuthResult #

Return an Unauthorized value, with the given i18n message.

runFakeHandler :: (Yesod site, MonadIO m) => SessionMap -> (site -> Logger) -> site -> HandlerT site IO a -> m (Either ErrorResponse a) #

getGetMaxExpires :: IO (IO Text) #

Default constructor for yreGetMaxExpires field. Low level function for simple manual construction of YesodRunnerEnv.

Since: yesod-core-1.4.29

warpEnv :: YesodDispatch site => site -> IO () #

Runs your application using default middlewares (i.e., via toWaiApp). It reads port information from the PORT environment variable, as used by tools such as Keter and the FP Complete School of Haskell.

Note that the exact behavior of this function may be modified slightly over time to work correctly with external tools, without a change to the type signature.

warpDebug :: YesodDispatch site => Int -> site -> IO () #

Deprecated synonym for warp.

defaultMiddlewaresNoLogging :: Middleware #

All of the default middlewares, excluding logging.

Since 1.2.12

mkDefaultMiddlewares :: Logger -> IO Middleware #

A default set of middlewares.

Since 1.2.0

warp :: YesodDispatch site => Int -> site -> IO () #

A convenience method to run an application using the Warp webserver on the specified port. Automatically calls toWaiApp. Provides a default set of middlewares. This set may change at any point without a breaking version number. Currently, it includes:

  • Logging
  • GZIP compression
  • Automatic HEAD method handling
  • Request method override with the _method query string parameter
  • Accept header override with the _accept query string parameter

If you need more fine-grained control of middlewares, please use toWaiApp directly.

Since 1.2.0

toWaiApp :: YesodDispatch site => site -> IO Application #

Same as toWaiAppPlain, but provides a default set of middlewares. This set may change with future releases, but currently covers:

  • Logging
  • GZIP compression
  • Automatic HEAD method handling
  • Request method override with the _method query string parameter
  • Accept header override with the _accept query string parameter

toWaiAppYre :: YesodDispatch site => YesodRunnerEnv site -> Application #

Pure low level function to construct WAI application. Usefull when you need not standard way to run your app, or want to embed it inside another app.

Since: yesod-core-1.4.29

defaultGen :: IO Int #

Generate a random number uniformly distributed in the full range of Int.

Note: Before 1.6.20, this generates pseudo-random number in an unspecified range. The range size may not be a power of 2. Since 1.6.20, this uses a secure entropy source and generates in the full range of Int.

Since: yesod-core-1.6.21.0

toWaiAppPlain :: YesodDispatch site => site -> IO Application #

Convert the given argument into a WAI application, executable with any WAI handler. This function will provide no middlewares; if you want commonly used middlewares, please use toWaiApp.

mkYesodData :: String -> [ResourceTree String] -> Q [Dec] #

Sometimes, you will want to declare your routes in one file and define your handlers elsewhere. For example, this is the only way to break up a monolithic file into smaller parts. Use this function, paired with mkYesodDispatch, to do just that.

mkYesodWith #

Arguments

:: [[String]]

list of contexts

-> String

name of the argument datatype

-> [String]

list of type variables

-> [ResourceTree String] 
-> Q [Dec] 

Similar to mkYesod, except contexts and type variables are not parsed. Instead, they are explicitly provided. You can write (MyClass a) => App a with mkYesodWith [["MyClass","a"]] "App" ["a"] ....

mkYesod #

Arguments

:: String

name of the argument datatype

-> [ResourceTree String] 
-> Q [Dec] 

Generates URL datatype and site function for the given Resources. This is used for creating sites, not subsites. See mkYesodSubData and mkYesodSubDispatch for the latter. Use parseRoutes to create the Resources.

Contexts and type variables in the name of the datatype are parsed. For example, a datatype App a with typeclass constraint MyClass a can be written as "(MyClass a) => App a".

parseRoutesNoCheck :: QuasiQuoter #

Same as parseRoutes, but performs no overlap checking.

parseRoutesFileNoCheck :: FilePath -> Q Exp #

Same as parseRoutesNoCheck, but uses an external file instead of quasiquotation.

The recommended file extension is .yesodroutes.

parseRoutesFile :: FilePath -> Q Exp #

Same as parseRoutes, but uses an external file instead of quasiquotation.

The recommended file extension is .yesodroutes.

parseRoutes :: QuasiQuoter #

A quasi-quoter to parse a string into a list of Resources. Checks for overlapping routes, failing if present; use parseRoutesNoCheck to skip the checking. See documentation site for details on syntax.

breadcrumbs :: (YesodBreadcrumbs site, Show (Route site), Eq (Route site)) => HandlerFor site (Text, [(Route site, Text)]) #

Gets the title of the current page and the hierarchy of parent pages, along with their respective titles.

class YesodBreadcrumbs site where #

A type-safe, concise method of creating breadcrumbs for pages. For each resource, you declare the title of the page and the parent resource (if present).

Methods

breadcrumb :: Route site -> HandlerFor site (Text, Maybe (Route site)) #

Returns the title and the parent resource, if available. If you return a Nothing, then this is considered a top-level page.

Instances

Instances details
YesodBreadcrumbs App Source # 
Instance details

Defined in BtcLsp.Yesod.Foundation

newtype LiteApp #

Constructors

LiteApp 

Instances

Instances details
Monoid LiteApp 
Instance details

Defined in Yesod.Core.Internal.LiteApp

Semigroup LiteApp 
Instance details

Defined in Yesod.Core.Internal.LiteApp

YesodDispatch LiteApp 
Instance details

Defined in Yesod.Core.Internal.LiteApp

Yesod LiteApp 
Instance details

Defined in Yesod.Core.Internal.LiteApp

Methods

approot :: Approot LiteApp #

errorHandler :: ErrorResponse -> HandlerFor LiteApp TypedContent #

defaultLayout :: WidgetFor LiteApp () -> HandlerFor LiteApp Html #

urlParamRenderOverride :: LiteApp -> Route LiteApp -> [(Text, Text)] -> Maybe Builder #

isAuthorized :: Route LiteApp -> Bool -> HandlerFor LiteApp AuthResult #

isWriteRequest :: Route LiteApp -> HandlerFor LiteApp Bool #

authRoute :: LiteApp -> Maybe (Route LiteApp) #

cleanPath :: LiteApp -> [Text] -> Either [Text] [Text] #

joinPath :: LiteApp -> Text -> [Text] -> [(Text, Text)] -> Builder #

addStaticContent :: Text -> Text -> ByteString -> HandlerFor LiteApp (Maybe (Either Text (Route LiteApp, [(Text, Text)]))) #

maximumContentLength :: LiteApp -> Maybe (Route LiteApp) -> Maybe Word64 #

maximumContentLengthIO :: LiteApp -> Maybe (Route LiteApp) -> IO (Maybe Word64) #

makeLogger :: LiteApp -> IO Logger #

messageLoggerSource :: LiteApp -> Logger -> Loc -> LogSource -> LogLevel -> LogStr -> IO () #

jsLoader :: LiteApp -> ScriptLoadPosition LiteApp #

jsAttributes :: LiteApp -> [(Text, Text)] #

jsAttributesHandler :: HandlerFor LiteApp [(Text, Text)] #

makeSessionBackend :: LiteApp -> IO (Maybe SessionBackend) #

fileUpload :: LiteApp -> RequestBodyLength -> FileUpload #

shouldLogIO :: LiteApp -> LogSource -> LogLevel -> IO Bool #

yesodMiddleware :: ToTypedContent res => HandlerFor LiteApp res -> HandlerFor LiteApp res #

yesodWithInternalState :: LiteApp -> Maybe (Route LiteApp) -> (InternalState -> IO a) -> IO a #

defaultMessageWidget :: Html -> HtmlUrl (Route LiteApp) -> WidgetFor LiteApp () #

ParseRoute LiteApp 
Instance details

Defined in Yesod.Core.Internal.LiteApp

Methods

parseRoute :: ([Text], [(Text, Text)]) -> Maybe (Route LiteApp) #

RenderRoute LiteApp 
Instance details

Defined in Yesod.Core.Internal.LiteApp

Associated Types

data Route LiteApp #

Methods

renderRoute :: Route LiteApp -> ([Text], [(Text, Text)]) #

Read (Route LiteApp) 
Instance details

Defined in Yesod.Core.Internal.LiteApp

Show (Route LiteApp) 
Instance details

Defined in Yesod.Core.Internal.LiteApp

Eq (Route LiteApp) 
Instance details

Defined in Yesod.Core.Internal.LiteApp

Ord (Route LiteApp) 
Instance details

Defined in Yesod.Core.Internal.LiteApp

data Route LiteApp 
Instance details

Defined in Yesod.Core.Internal.LiteApp

class Yesod site => YesodDispatch site where #

This class is automatically instantiated when you use the template haskell mkYesod function. You should never need to deal with it directly.

Instances

Instances details
YesodDispatch App Source # 
Instance details

Defined in BtcLsp.Yesod.Application

YesodDispatch LiteApp 
Instance details

Defined in Yesod.Core.Internal.LiteApp

class YesodSubDispatch sub master where #

Instances

Instances details
YesodSubDispatch WaiSubsite master 
Instance details

Defined in Yesod.Core.Class.Dispatch

YesodSubDispatch WaiSubsiteWithAuth master 
Instance details

Defined in Yesod.Core.Class.Dispatch

YesodSubDispatch Static master 
Instance details

Defined in Yesod.Static

yesodRender #

Arguments

:: Yesod y 
=> y 
-> ResolvedApproot 
-> Route y 
-> [(Text, Text)]

url query string

-> Text 

yesodRunner :: (ToTypedContent res, Yesod site) => HandlerFor site res -> YesodRunnerEnv site -> Maybe (Route site) -> Application #

contentTypeHeaderIsJson :: ByteString -> Bool #

Given the Content-Type header, returns if it is JSON.

This function is currently a simple check for application/json, but in the future may check for alternative representations such as xxx/yyy+json.

Since: yesod-core-1.6.17

acceptsJson :: MonadHandler m => m Bool #

Returns True if the client prefers application/json as indicated by the Accept HTTP header.

jsonEncodingOrRedirect #

Arguments

:: (MonadHandler m, ToJSON a) 
=> Route (HandlerSite m)

Redirect target

-> a

Data to send via JSON

-> m Encoding 

jsonEncodingOrRedirect simplifies the scenario where a POST handler sends a different response based on Accept headers:

  1. 200 with JSON data if the client prefers application/json (e.g. AJAX, see acceptsJSON).
  2. 3xx otherwise, following the PRG pattern. @since 1.4.21

jsonOrRedirect #

Arguments

:: (MonadHandler m, ToJSON a) 
=> Route (HandlerSite m)

Redirect target

-> a

Data to send via JSON

-> m Value 

jsonOrRedirect simplifies the scenario where a POST handler sends a different response based on Accept headers:

  1. 200 with JSON data if the client prefers application/json (e.g. AJAX, see acceptsJSON).
  2. 3xx otherwise, following the PRG pattern.

array :: ToJSON a => [a] -> Value #

Convert a list of values to an Array.

requireCheckJsonBody :: (MonadHandler m, FromJSON a) => m a #

Same as parseCheckJsonBody, but return an invalid args response on a parse error.

requireInsecureJsonBody :: (MonadHandler m, FromJSON a) => m a #

Same as parseInsecureJsonBody, but return an invalid args response on a parse error.

Since: yesod-core-1.6.11

requireJsonBody :: (MonadHandler m, FromJSON a) => m a #

Same as parseInsecureJsonBody, but return an invalid args response on a parse error.

parseJsonBody_ :: (MonadHandler m, FromJSON a) => m a #

Same as parseInsecureJsonBody, but return an invalid args response on a parse error.

parseCheckJsonBody :: (MonadHandler m, FromJSON a) => m (Result a) #

Parse the request body to a data type as a JSON value. The data type must support conversion from JSON via FromJSON. If you want the raw JSON value, just ask for a Result Value.

The MIME type must indicate JSON content. Requiring a JSON content-type helps secure your site against CSRF attacks (browsers will perform POST requests for form and text/plain content-types without doing a CORS check, and those content-types can easily contain valid JSON).

Note that this function will consume the request body. As such, calling it twice will result in a parse error on the second call, since the request body will no longer be available.

Since: yesod-core-0.3.0

parseInsecureJsonBody :: (MonadHandler m, FromJSON a) => m (Result a) #

Same as parseCheckJsonBody, but does not check that the mime type indicates JSON content.

Note: This function is vulnerable to CSRF attacks.

Since: yesod-core-1.6.11

parseJsonBody :: (MonadHandler m, FromJSON a) => m (Result a) #

Same as parseInsecureJsonBody

Since: yesod-core-0.3.0

provideJson :: forall (m :: Type -> Type) a. (Monad m, ToJSON a) => a -> Writer (Endo [ProvidedRep m]) () #

Provide a JSON representation for usage with selectReps, using aeson's toJSON (aeson >= 0.11: toEncoding) function to perform the conversion.

Since: yesod-core-1.2.1

returnJsonEncoding :: (Monad m, ToJSON a) => a -> m Encoding #

Convert a value to a JSON representation via aeson's toEncoding function.

Since: yesod-core-1.4.21

returnJson :: (Monad m, ToJSON a) => a -> m Value #

Convert a value to a JSON representation via aeson's toJSON function.

Since: yesod-core-1.2.1

jsonToRepJson :: (Monad m, ToJSON a) => a -> m Value #

Wraps a data type in a RepJson. The data type must support conversion to JSON via ToJSON.

Since: yesod-core-0.3.0

defaultLayoutJson #

Arguments

:: (Yesod site, ToJSON a) 
=> WidgetFor site ()

HTML

-> HandlerFor site a

JSON

-> HandlerFor site TypedContent 

Provide both an HTML and JSON representation for a piece of data, using the default layout for the HTML output (defaultLayout).

Since: yesod-core-0.3.0

getApprootText :: Approot site -> site -> Request -> Text #

Get the textual application root from an Approot value.

Since 1.4.17

guessApprootOr :: Approot site -> Approot site #

Guess the approot based on request headers, with fall back to the specified AppRoot.

Since 1.4.16

guessApproot :: Approot site #

Guess the approot based on request headers. For more information, see Network.Wai.Middleware.Approot

In the case of headers being unavailable, it falls back to ApprootRelative

Since 1.4.16

envClientSessionBackend #

Arguments

:: Int

minutes

-> String

environment variable name

-> IO SessionBackend 

Create a SessionBackend which reads the session key from the named environment variable.

This can be useful if:

  1. You can't rely on a persistent file system (e.g. Heroku)
  2. Your application is open source (e.g. you can't commit the key)

By keeping a consistent value in the environment variable, your users will have consistent sessions without relying on the file system.

Note: A suitable value should only be obtained in one of two ways:

  1. Run this code without the variable set, a value will be generated and printed on devstdout/
  2. Use clientsession-generate

Since 1.4.5

defaultClientSessionBackend #

Arguments

:: Int

minutes

-> FilePath

key file

-> IO SessionBackend 

customizeSessionCookies :: (SetCookie -> SetCookie) -> SessionBackend -> SessionBackend #

Customize the cookies used by the session backend. You may use this function on your definition of makeSessionBackend.

For example, you could set the cookie domain so that it would work across many subdomains:

makeSessionBackend site =
    (fmap . fmap) (customizeSessionCookies addDomain) ...
  where
    addDomain cookie = cookie { setCookieDomain = Just ".example.com" }

Default: Do not customize anything (id).

formatLogMessage #

Arguments

:: IO ZonedDate 
-> Loc 
-> LogSource 
-> LogLevel 
-> LogStr

message

-> IO LogStr 

Default formatting for log messages. When you use the template haskell logging functions for to log with information about the source location, that information will be appended to the end of the log. When you use the non-TH logging functions, like logDebugN, this function does not include source information. This currently works by checking to see if the package name is the string "<unknown>". This is a hack, but it removes some of the visual clutter from non-TH logs.

Since 1.4.10

defaultErrorHandler :: Yesod site => ErrorResponse -> HandlerFor site TypedContent #

The default error handler for errorHandler.

widgetToPageContent :: Yesod site => WidgetFor site () -> HandlerFor site (PageContent (Route site)) #

Convert a widget to a PageContent.

defaultCsrfMiddleware :: Yesod site => HandlerFor site res -> HandlerFor site res #

Calls defaultCsrfSetCookieMiddleware and defaultCsrfCheckMiddleware.

For details, see the "AJAX CSRF protection" section of Yesod.Core.Handler.

You can chain this middleware together with other middleware like so:

yesodMiddleware = defaultYesodMiddleware . defaultCsrfMiddleware

or:

yesodMiddleware app = defaultYesodMiddleware $ defaultCsrfMiddleware $ app

Since 1.4.14

csrfSetCookieMiddleware :: HandlerFor site res -> SetCookie -> HandlerFor site res #

Takes a SetCookie and overrides its value with a CSRF token, then sets the cookie. See setCsrfCookieWithCookie.

For details, see the "AJAX CSRF protection" section of Yesod.Core.Handler.

Make sure to set the setCookiePath to the root path of your application, otherwise you'll generate a new CSRF token for every path of your app. If your app is run from from e.g. www.example.com/app1, use app1. The vast majority of sites will just use /.

Since 1.4.14

defaultCsrfSetCookieMiddleware :: HandlerFor site res -> HandlerFor site res #

Calls csrfSetCookieMiddleware with the defaultCsrfCookieName.

The cookie's path is set to /, making it valid for your whole website.

Since 1.4.14

csrfCheckMiddleware #

Arguments

:: HandlerFor site res 
-> HandlerFor site Bool

Whether or not to perform the CSRF check.

-> CI ByteString

The header name to lookup the CSRF token from.

-> Text

The POST parameter name to lookup the CSRF token from.

-> HandlerFor site res 

Looks up the CSRF token from the request headers or POST parameters. If the value doesn't match the token stored in the session, this function throws a PermissionDenied error.

For details, see the "AJAX CSRF protection" section of Yesod.Core.Handler.

Since 1.4.14

authorizationCheck :: Yesod site => HandlerFor site () #

Check if a given request is authorized via isAuthorized and isWriteRequest.

Since 1.2.0

sslOnlyMiddleware #

Arguments

:: Int

minutes

-> HandlerFor site res 
-> HandlerFor site res 

Apply a Strict-Transport-Security header with the specified timeout to all responses so that browsers will rewrite all http links to https until the timeout expires. For security, the max-age of the STS header should always equal or exceed the client sessions timeout. This defends against SSL-stripping man-in-the-middle attacks. It is only effective if a secure connection has already been made; Strict-Transport-Security headers are ignored over HTTP.

Since 1.4.7

strictSameSiteSessions :: IO (Maybe SessionBackend) -> IO (Maybe SessionBackend) #

Helps defend against CSRF attacks by setting the SameSite attribute on session cookies to Strict. With the Strict setting, the cookie will only be sent with same-site requests.

This option is liable to change in future versions of Yesod as the spec evolves. View more information here.

Since: yesod-core-1.4.23

laxSameSiteSessions :: IO (Maybe SessionBackend) -> IO (Maybe SessionBackend) #

Helps defend against CSRF attacks by setting the SameSite attribute on session cookies to Lax. With the Lax setting, the cookie will be sent with same-site requests, and with cross-site top-level navigations.

This option is liable to change in future versions of Yesod as the spec evolves. View more information here.

Since: yesod-core-1.4.23

sslOnlySessions :: IO (Maybe SessionBackend) -> IO (Maybe SessionBackend) #

Defends against session hijacking by setting the secure bit on session cookies so that browsers will not transmit them over http. With this setting on, it follows that the server will regard requests made over http as sessionless, because the session cookie will not be included in the request. Use this as part of a total security measure which also includes disabling HTTP traffic to the site or issuing redirects from HTTP urls, and composing sslOnlyMiddleware with the site's yesodMiddleware.

Since 1.4.7

defaultYesodMiddleware :: Yesod site => HandlerFor site res -> HandlerFor site res #

Default implementation of yesodMiddleware. Adds the response header "Vary: Accept, Accept-Language", "X-XSS-Protection: 1; mode=block", and performs authorization checks.

Since 1.2.0

defaultShouldLogIO :: LogSource -> LogLevel -> IO Bool #

Default implementation of shouldLog. Logs everything at or above LevelInfo.

Since 1.4.10

defaultMessageLoggerSource #

Arguments

:: (LogSource -> LogLevel -> IO Bool)

Check whether we should log this

-> Logger 
-> Loc

position in source code

-> LogSource 
-> LogLevel 
-> LogStr

message

-> IO () 

Default implementation of messageLoggerSource. Checks if the message should be logged using the provided function, and if so, formats using formatLogMessage. You can use defaultShouldLogIO as the provided function.

Since 1.4.10

defaultMakeLogger :: IO Logger #

Default implementation of makeLogger. Sends to stdout and automatically flushes on each write.

Since 1.4.10

class RenderRoute site => Yesod site where #

Define settings for a Yesod applications. All methods have intelligent defaults, and therefore no implementation is required.

Minimal complete definition

Nothing

Methods

approot :: Approot site #

An absolute URL to the root of the application. Do not include trailing slash.

Default value: guessApproot. If you know your application root statically, it will be more efficient and more reliable to instead use ApprootStatic or ApprootMaster. If you do not need full absolute URLs, you can use ApprootRelative instead.

Note: Prior to yesod-core 1.5, the default value was ApprootRelative.

errorHandler :: ErrorResponse -> HandlerFor site TypedContent #

Output error response pages.

Default value: defaultErrorHandler.

defaultLayout :: WidgetFor site () -> HandlerFor site Html #

Applies some form of layout to the contents of a page.

urlParamRenderOverride #

Arguments

:: site 
-> Route site 
-> [(Text, Text)]

query string

-> Maybe Builder 

Override the rendering function for a particular URL and query string parameters. One use case for this is to offload static hosting to a different domain name to avoid sending cookies.

For backward compatibility default implementation is in terms of urlRenderOverride, probably ineffective

Since 1.4.23

isAuthorized #

Arguments

:: Route site 
-> Bool

is this a write request?

-> HandlerFor site AuthResult 

Determine if a request is authorized or not.

Return Authorized if the request is authorized, Unauthorized a message if unauthorized. If authentication is required, return AuthenticationRequired.

isWriteRequest :: Route site -> HandlerFor site Bool #

Determines whether the current request is a write request. By default, this assumes you are following RESTful principles, and determines this from request method. In particular, all except the following request methods are considered write: GET HEAD OPTIONS TRACE.

This function is used to determine if a request is authorized; see isAuthorized.

authRoute :: site -> Maybe (Route site) #

The default route for authentication.

Used in particular by isAuthorized, but library users can do whatever they want with it.

cleanPath :: site -> [Text] -> Either [Text] [Text] #

A function used to clean up path segments. It returns Right with a clean path or Left with a new set of pieces the user should be redirected to. The default implementation enforces:

  • No double slashes
  • There is no trailing slash.

Note that versions of Yesod prior to 0.7 used a different set of rules involing trailing slashes.

joinPath #

Arguments

:: site 
-> Text

application root

-> [Text]

path pieces

-> [(Text, Text)]

query string

-> Builder 

Builds an absolute URL by concatenating the application root with the pieces of a path and a query string, if any. Note that the pieces of the path have been previously cleaned up by cleanPath.

addStaticContent #

Arguments

:: Text

filename extension

-> Text

mime-type

-> ByteString

content

-> HandlerFor site (Maybe (Either Text (Route site, [(Text, Text)]))) 

This function is used to store some static content to be served as an external file. The most common case of this is stashing CSS and JavaScript content in an external file; the Yesod.Widget module uses this feature.

The return value is Nothing if no storing was performed; this is the default implementation. A Just Left gives the absolute URL of the file, whereas a Just Right gives the type-safe URL. The former is necessary when you are serving the content outside the context of a Yesod application, such as via memcached.

maximumContentLength :: site -> Maybe (Route site) -> Maybe Word64 #

Maximum allowed length of the request body, in bytes. This method may be ignored if maximumContentLengthIO is overridden.

If Nothing, no maximum is applied.

Default: 2 megabytes.

maximumContentLengthIO :: site -> Maybe (Route site) -> IO (Maybe Word64) #

Maximum allowed length of the request body, in bytes. This is similar to maximumContentLength, but the result lives in IO. This allows you to dynamically change the maximum file size based on some external source like a database or an IORef.

The default implementation uses maximumContentLength. Future version of yesod will remove maximumContentLength and use this method exclusively.

Since: yesod-core-1.6.13

makeLogger :: site -> IO Logger #

Creates a Logger to use for log messages.

Note that a common technique (endorsed by the scaffolding) is to create a Logger value and place it in your foundation datatype, and have this method return that already created value. That way, you can use that same Logger for printing messages during app initialization.

Default: the defaultMakeLogger function.

messageLoggerSource #

Arguments

:: site 
-> Logger 
-> Loc

position in source code

-> LogSource 
-> LogLevel 
-> LogStr

message

-> IO () 

Send a message to the Logger provided by getLogger.

Default: the defaultMessageLoggerSource function, using shouldLogIO to check whether we should log.

jsLoader :: site -> ScriptLoadPosition site #

Where to Load sripts from. We recommend the default value, BottomOfBody.

jsAttributes :: site -> [(Text, Text)] #

Default attributes to put on the JavaScript script tag generated for julius files

jsAttributesHandler :: HandlerFor site [(Text, Text)] #

Same as jsAttributes but allows you to run arbitrary Handler code

This is useful if you need to add a randomised nonce value to the script tag generated by widgetFile. If this function is overridden then jsAttributes is ignored.

Since: yesod-core-1.6.16

makeSessionBackend :: site -> IO (Maybe SessionBackend) #

Create a session backend. Returning Nothing disables sessions. If you'd like to change the way that the session cookies are created, take a look at customizeSessionCookies.

Default: Uses clientsession with a 2 hour timeout.

fileUpload :: site -> RequestBodyLength -> FileUpload #

How to store uploaded files.

Default: When the request body is greater than 50kb, store in a temp file. For chunked request bodies, store in a temp file. Otherwise, store in memory.

shouldLogIO :: site -> LogSource -> LogLevel -> IO Bool #

Should we log the given log source/level combination.

Default: the defaultShouldLogIO function.

Since 1.2.4

yesodMiddleware :: ToTypedContent res => HandlerFor site res -> HandlerFor site res #

A Yesod middleware, which will wrap every handler function. This allows you to run code before and after a normal handler.

Default: the defaultYesodMiddleware function.

Since: 1.1.6

yesodWithInternalState :: site -> Maybe (Route site) -> (InternalState -> IO a) -> IO a #

How to allocate an InternalState for each request.

The default implementation is almost always what you want. However, if you know that you are never taking advantage of the MonadResource instance in your handler functions, setting this to a dummy implementation can provide a small optimization. Only do this if you really know what you're doing, otherwise you can turn safe code into a runtime error!

Since 1.4.2

defaultMessageWidget :: Html -> HtmlUrl (Route site) -> WidgetFor site () #

Convert a title and HTML snippet into a Widget. Used primarily for wrapping up error messages for better display.

Since: yesod-core-1.4.30

Instances

Instances details
Yesod App Source # 
Instance details

Defined in BtcLsp.Yesod.Foundation

Yesod LiteApp 
Instance details

Defined in Yesod.Core.Internal.LiteApp

Methods

approot :: Approot LiteApp #

errorHandler :: ErrorResponse -> HandlerFor LiteApp TypedContent #

defaultLayout :: WidgetFor LiteApp () -> HandlerFor LiteApp Html #

urlParamRenderOverride :: LiteApp -> Route LiteApp -> [(Text, Text)] -> Maybe Builder #

isAuthorized :: Route LiteApp -> Bool -> HandlerFor LiteApp AuthResult #

isWriteRequest :: Route LiteApp -> HandlerFor LiteApp Bool #

authRoute :: LiteApp -> Maybe (Route LiteApp) #

cleanPath :: LiteApp -> [Text] -> Either [Text] [Text] #

joinPath :: LiteApp -> Text -> [Text] -> [(Text, Text)] -> Builder #

addStaticContent :: Text -> Text -> ByteString -> HandlerFor LiteApp (Maybe (Either Text (Route LiteApp, [(Text, Text)]))) #

maximumContentLength :: LiteApp -> Maybe (Route LiteApp) -> Maybe Word64 #

maximumContentLengthIO :: LiteApp -> Maybe (Route LiteApp) -> IO (Maybe Word64) #

makeLogger :: LiteApp -> IO Logger #

messageLoggerSource :: LiteApp -> Logger -> Loc -> LogSource -> LogLevel -> LogStr -> IO () #

jsLoader :: LiteApp -> ScriptLoadPosition LiteApp #

jsAttributes :: LiteApp -> [(Text, Text)] #

jsAttributesHandler :: HandlerFor LiteApp [(Text, Text)] #

makeSessionBackend :: LiteApp -> IO (Maybe SessionBackend) #

fileUpload :: LiteApp -> RequestBodyLength -> FileUpload #

shouldLogIO :: LiteApp -> LogSource -> LogLevel -> IO Bool #

yesodMiddleware :: ToTypedContent res => HandlerFor LiteApp res -> HandlerFor LiteApp res #

yesodWithInternalState :: LiteApp -> Maybe (Route LiteApp) -> (InternalState -> IO a) -> IO a #

defaultMessageWidget :: Html -> HtmlUrl (Route LiteApp) -> WidgetFor LiteApp () #

ihamletToHtml :: (MonadHandler m, RenderMessage (HandlerSite m) message) => HtmlUrlI18n message (Route (HandlerSite m)) -> m Html #

Wraps the Content generated by hamletToContent in a RepHtml.

Since 1.2.1

ihamletToRepHtml :: (MonadHandler m, RenderMessage (HandlerSite m) message) => HtmlUrlI18n message (Route (HandlerSite m)) -> m Html #

Wraps the Content generated by hamletToContent in a RepHtml.

asWidgetT :: forall site (m :: Type -> Type). WidgetT site m () -> WidgetT site m () #

addScriptRemoteAttrs :: MonadWidget m => Text -> [(Text, Text)] -> m () #

Link to the specified remote script.

addScriptRemote :: MonadWidget m => Text -> m () #

Link to the specified remote script.

addScriptAttrs :: MonadWidget m => Route (HandlerSite m) -> [(Text, Text)] -> m () #

Link to the specified local script.

addScript :: MonadWidget m => Route (HandlerSite m) -> m () #

Link to the specified local script.

addStylesheetRemoteAttrs :: MonadWidget m => Text -> [(Text, Text)] -> m () #

Link to the specified remote stylesheet.

addStylesheetRemote :: MonadWidget m => Text -> m () #

Link to the specified remote stylesheet.

addStylesheetAttrs :: MonadWidget m => Route (HandlerSite m) -> [(Text, Text)] -> m () #

Link to the specified local stylesheet.

addStylesheet :: MonadWidget m => Route (HandlerSite m) -> m () #

Link to the specified local stylesheet.

setOGImage :: MonadWidget m => Text -> m () #

Add OpenGraph image meta tag to the head of the page

Best practices:

  • Use custom images for shareable pages, e.g., homepage, articles, etc.
  • Use your logo or any other branded image for the rest of your pages.
  • Use images with a 1.91:1 ratio and minimum recommended dimensions of 1200x630 for optimal clarity across all devices.

Source: https://ahrefs.com/blog/open-graph-meta-tags/

Since: yesod-core-1.6.18

setOGType :: MonadWidget m => Text -> m () #

Add OpenGraph type meta tag to the head of the page

See all available OG types here: https://ogp.me/#types

Since: yesod-core-1.6.18

setDescriptionI :: (MonadWidget m, RenderMessage (HandlerSite m) msg) => msg -> m () #

Add translated description meta tag to the head of the page

n.b. See comments for setDescription.

Since: yesod-core-1.6.18

setDescription :: MonadWidget m => Text -> m () #

Add description meta tag to the head of the page

Google does not use the description tag as a ranking signal, but the contents of this tag will likely affect your click-through rate since it shows up in search results.

The average length of the description shown in Google's search results is about 160 characters on desktop, and about 130 characters on mobile, at time of writing.

Source: https://www.advancedwebranking.com/blog/meta-tags-important-in-seo/

Since: yesod-core-1.6.18

setTitleI :: (MonadWidget m, RenderMessage (HandlerSite m) msg) => msg -> m () #

Set the localised page title.

n.b. See comments for setTitle

setTitle :: MonadWidget m => Html -> m () #

Set the page title.

Calling setTitle or setTitleI multiple times overrides previously set values.

SEO Notes:

  • Title tags are the second most important on-page factor for SEO, after content
  • Every page should have a unique title tag
  • Start your title tag with your main targeted keyword
  • Don't stuff your keywords
  • Google typically shows 55-64 characters, so aim to keep your title length under 60 characters

type WidgetT site (m :: Type -> Type) = WidgetFor site #

class ToWidget site a where #

Methods

toWidget :: (MonadWidget m, HandlerSite m ~ site) => a -> m () #

Instances

Instances details
ToWidget site Html 
Instance details

Defined in Yesod.Core.Widget

Methods

toWidget :: (MonadWidget m, HandlerSite m ~ site) => Html -> m () #

ToWidget site Css 
Instance details

Defined in Yesod.Core.Widget

Methods

toWidget :: (MonadWidget m, HandlerSite m ~ site) => Css -> m () #

ToWidget site Javascript 
Instance details

Defined in Yesod.Core.Widget

Methods

toWidget :: (MonadWidget m, HandlerSite m ~ site) => Javascript -> m () #

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

ToWidget site Builder

Since: yesod-core-1.4.28

Instance details

Defined in Yesod.Core.Widget

Methods

toWidget :: (MonadWidget m, HandlerSite m ~ site) => Builder -> m () #

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

ToWidget site CssBuilder 
Instance details

Defined in Yesod.Core.Widget

Methods

toWidget :: (MonadWidget m, HandlerSite m ~ site) => CssBuilder -> m () #

render ~ RY site => ToWidget site (render -> Html) 
Instance details

Defined in Yesod.Core.Widget

Methods

toWidget :: (MonadWidget m, HandlerSite m ~ site) => (render -> Html) -> m () #

render ~ RY site => ToWidget site (render -> Css) 
Instance details

Defined in Yesod.Core.Widget

Methods

toWidget :: (MonadWidget m, HandlerSite m ~ site) => (render -> Css) -> m () #

render ~ RY site => ToWidget site (render -> Javascript) 
Instance details

Defined in Yesod.Core.Widget

Methods

toWidget :: (MonadWidget m, HandlerSite m ~ site) => (render -> Javascript) -> m () #

render ~ RY site => ToWidget site (render -> CssBuilder) 
Instance details

Defined in Yesod.Core.Widget

Methods

toWidget :: (MonadWidget m, HandlerSite m ~ site) => (render -> CssBuilder) -> m () #

(site' ~ site, a ~ ()) => ToWidget site' (WidgetFor site a) 
Instance details

Defined in Yesod.Core.Widget

Methods

toWidget :: (MonadWidget m, HandlerSite m ~ site') => WidgetFor site a -> m () #

class ToWidgetMedia site a where #

Allows adding some CSS to the page with a specific media type.

Since 1.2

Methods

toWidgetMedia #

Arguments

:: (MonadWidget m, HandlerSite m ~ site) 
=> Text

media value

-> a 
-> m () 

Add the given content to the page, but only for the given media type.

Since 1.2

Instances

Instances details
ToWidgetMedia site Css 
Instance details

Defined in Yesod.Core.Widget

Methods

toWidgetMedia :: (MonadWidget m, HandlerSite m ~ site) => Text -> Css -> m () #

ToWidgetMedia site CssBuilder 
Instance details

Defined in Yesod.Core.Widget

Methods

toWidgetMedia :: (MonadWidget m, HandlerSite m ~ site) => Text -> CssBuilder -> m () #

render ~ RY site => ToWidgetMedia site (render -> Css) 
Instance details

Defined in Yesod.Core.Widget

Methods

toWidgetMedia :: (MonadWidget m, HandlerSite m ~ site) => Text -> (render -> Css) -> m () #

render ~ RY site => ToWidgetMedia site (render -> CssBuilder) 
Instance details

Defined in Yesod.Core.Widget

Methods

toWidgetMedia :: (MonadWidget m, HandlerSite m ~ site) => Text -> (render -> CssBuilder) -> m () #

class ToWidgetBody site a where #

Methods

toWidgetBody :: (MonadWidget m, HandlerSite m ~ site) => a -> m () #

Instances

Instances details
ToWidgetBody site Html 
Instance details

Defined in Yesod.Core.Widget

Methods

toWidgetBody :: (MonadWidget m, HandlerSite m ~ site) => Html -> m () #

ToWidgetBody site Javascript 
Instance details

Defined in Yesod.Core.Widget

Methods

toWidgetBody :: (MonadWidget m, HandlerSite m ~ site) => Javascript -> m () #

render ~ RY site => ToWidgetBody site (render -> Html) 
Instance details

Defined in Yesod.Core.Widget

Methods

toWidgetBody :: (MonadWidget m, HandlerSite m ~ site) => (render -> Html) -> m () #

render ~ RY site => ToWidgetBody site (render -> Javascript) 
Instance details

Defined in Yesod.Core.Widget

Methods

toWidgetBody :: (MonadWidget m, HandlerSite m ~ site) => (render -> Javascript) -> m () #

class ToWidgetHead site a where #

Methods

toWidgetHead :: (MonadWidget m, HandlerSite m ~ site) => a -> m () #

Instances

Instances details
ToWidgetHead site Html 
Instance details

Defined in Yesod.Core.Widget

Methods

toWidgetHead :: (MonadWidget m, HandlerSite m ~ site) => Html -> m () #

ToWidgetHead site Css 
Instance details

Defined in Yesod.Core.Widget

Methods

toWidgetHead :: (MonadWidget m, HandlerSite m ~ site) => Css -> m () #

ToWidgetHead site Javascript 
Instance details

Defined in Yesod.Core.Widget

Methods

toWidgetHead :: (MonadWidget m, HandlerSite m ~ site) => Javascript -> m () #

ToWidgetHead site CssBuilder 
Instance details

Defined in Yesod.Core.Widget

Methods

toWidgetHead :: (MonadWidget m, HandlerSite m ~ site) => CssBuilder -> m () #

render ~ RY site => ToWidgetHead site (render -> Html) 
Instance details

Defined in Yesod.Core.Widget

Methods

toWidgetHead :: (MonadWidget m, HandlerSite m ~ site) => (render -> Html) -> m () #

render ~ RY site => ToWidgetHead site (render -> Css) 
Instance details

Defined in Yesod.Core.Widget

Methods

toWidgetHead :: (MonadWidget m, HandlerSite m ~ site) => (render -> Css) -> m () #

render ~ RY site => ToWidgetHead site (render -> Javascript) 
Instance details

Defined in Yesod.Core.Widget

Methods

toWidgetHead :: (MonadWidget m, HandlerSite m ~ site) => (render -> Javascript) -> m () #

render ~ RY site => ToWidgetHead site (render -> CssBuilder) 
Instance details

Defined in Yesod.Core.Widget

Methods

toWidgetHead :: (MonadWidget m, HandlerSite m ~ site) => (render -> CssBuilder) -> m () #

checkCsrfHeaderOrParam #

Arguments

:: (MonadHandler m, MonadLogger m) 
=> CI ByteString

The header name to lookup the CSRF token

-> Text

The POST parameter name to lookup the CSRF token

-> m () 

Checks that a valid CSRF token is present in either the request headers or POST parameters. If the value doesn't match the token stored in the session, this function throws a PermissionDenied error.

Since: yesod-core-1.4.14

hasValidCsrfParamNamed :: MonadHandler m => Text -> m Bool #

Takes a POST parameter name to lookup a CSRF token, and returns whether the value matches the token stored in the session.

Since: yesod-core-1.4.14

checkCsrfParamNamed :: MonadHandler m => Text -> m () #

Takes a POST parameter name to lookup a CSRF token. If the value doesn't match the token stored in the session, this function throws a PermissionDenied error.

Since: yesod-core-1.4.14

defaultCsrfParamName :: Text #

The default parameter name for the CSRF token ("_token")

Since: yesod-core-1.4.14

hasValidCsrfHeaderNamed :: MonadHandler m => CI ByteString -> m Bool #

Takes a header name to lookup a CSRF token, and returns whether the value matches the token stored in the session.

Since: yesod-core-1.4.14

checkCsrfHeaderNamed :: MonadHandler m => CI ByteString -> m () #

Takes a header name to lookup a CSRF token. If the value doesn't match the token stored in the session, this function throws a PermissionDenied error.

Since: yesod-core-1.4.14

defaultCsrfHeaderName :: CI ByteString #

The default header name for the CSRF token ("X-XSRF-TOKEN").

Since: yesod-core-1.4.14

setCsrfCookieWithCookie :: MonadHandler m => SetCookie -> m () #

Takes a SetCookie and overrides its value with a CSRF token, then sets the cookie.

Make sure to set the setCookiePath to the root path of your application, otherwise you'll generate a new CSRF token for every path of your app. If your app is run from from e.g. www.example.com/app1, use app1. The vast majority of sites will just use /.

Since: yesod-core-1.4.14

setCsrfCookie :: MonadHandler m => m () #

Sets a cookie with a CSRF token, using defaultCsrfCookieName for the cookie name.

The cookie's path is set to /, making it valid for your whole website.

Since: yesod-core-1.4.14

defaultCsrfCookieName :: ByteString #

The default cookie name for the CSRF token ("XSRF-TOKEN").

Since: yesod-core-1.4.14

sendChunkHtml :: forall (m :: Type -> Type) i. Monad m => Html -> ConduitT i (Flush Builder) m () #

Type-specialized version of sendChunk for Htmls.

Since: yesod-core-1.2.0

sendChunkLazyText :: forall (m :: Type -> Type) i. Monad m => Text -> ConduitT i (Flush Builder) m () #

Type-specialized version of sendChunk for lazy Texts.

Since: yesod-core-1.2.0

sendChunkText :: forall (m :: Type -> Type) i. Monad m => Text -> ConduitT i (Flush Builder) m () #

Type-specialized version of sendChunk for strict Texts.

Since: yesod-core-1.2.0

sendChunkLBS :: forall (m :: Type -> Type) i. Monad m => ByteString -> ConduitT i (Flush Builder) m () #

Type-specialized version of sendChunk for lazy ByteStrings.

Since: yesod-core-1.2.0

sendChunkBS :: forall (m :: Type -> Type) i. Monad m => ByteString -> ConduitT i (Flush Builder) m () #

Type-specialized version of sendChunk for strict ByteStrings.

Since: yesod-core-1.2.0

sendFlush :: forall (m :: Type -> Type) i. Monad m => ConduitT i (Flush Builder) m () #

In a streaming response, send a flush command, causing all buffered data to be immediately sent to the client.

Since: yesod-core-1.2.0

sendChunk :: forall (m :: Type -> Type) a i. (Monad m, ToFlushBuilder a) => a -> ConduitT i (Flush Builder) m () #

In a streaming response, send a single chunk of data. This function works on most datatypes, such as ByteString and Html.

Since: yesod-core-1.2.0

respondSource :: ContentType -> ConduitT () (Flush Builder) (HandlerFor site) () -> HandlerFor site TypedContent #

Use a Source for the response body.

Note that, for ease of use, the underlying monad is a HandlerFor. This implies that you can run any HandlerFor action. However, since a streaming response occurs after the response headers have already been sent, some actions make no sense here. For example: short-circuit responses, setting headers, changing status codes, etc.

Since: yesod-core-1.2.0

respond :: (Monad m, ToContent a) => ContentType -> a -> m TypedContent #

Provide a pure value for the response body.

respond ct = return . TypedContent ct . toContent

Since: yesod-core-1.2.0

fileSourceByteString :: MonadResource m => FileInfo -> m ByteString #

Extract a strict ByteString body from a FileInfo.

This function will block while reading the file.

do
    fileByteString <- fileSourceByteString fileInfo

Since: yesod-core-1.6.5

fileSource :: forall (m :: Type -> Type). MonadResource m => FileInfo -> ConduitT () ByteString m () #

Stream the data from the file. Since Yesod 1.2, this has been generalized to work in any MonadResource.

rawRequestBody :: forall (m :: Type -> Type) i. MonadHandler m => ConduitT i ByteString m () #

Stream in the raw request body without any parsing.

Since: yesod-core-1.2.0

provideRepType :: (Monad m, ToContent a) => ContentType -> m a -> Writer (Endo [ProvidedRep m]) () #

Same as provideRep, but instead of determining the content type from the type of the value itself, you provide the content type separately. This can be a convenience instead of creating newtype wrappers for uncommonly used content types.

provideRepType "application/x-special-format" "This is the content"

Since: yesod-core-1.2.0

provideRep :: (Monad m, HasContentType a) => m a -> Writer (Endo [ProvidedRep m]) () #

Provide a single representation to be used, based on the request of the client. Should be used together with selectRep.

Since: yesod-core-1.2.0

selectRep :: MonadHandler m => Writer (Endo [ProvidedRep m]) () -> m TypedContent #

Select a representation to send to the client based on the representations provided inside this do-block. Should be used together with provideRep.

Since: yesod-core-1.2.0

lookupCookies :: MonadHandler m => Text -> m [Text] #

Lookup for cookie data.

lookupCookie :: MonadHandler m => Text -> m (Maybe Text) #

Lookup for cookie data.

lookupFiles :: MonadHandler m => Text -> m [FileInfo] #

Lookup for POSTed files.

lookupFile :: MonadHandler m => Text -> m (Maybe FileInfo) #

Lookup for POSTed files.

lookupPostParams :: (MonadResource m, MonadHandler m) => Text -> m [Text] #

Lookup for POST parameters.

lookupGetParam :: MonadHandler m => Text -> m (Maybe Text) #

Lookup for GET parameters.

lookupGetParams :: MonadHandler m => Text -> m [Text] #

Lookup for GET parameters.

lookupBearerAuth :: MonadHandler m => m (Maybe Text) #

Lookup bearer authentication datafrom Authorization header of request. Returns bearer token value

Since: yesod-core-1.4.9

lookupBasicAuth :: MonadHandler m => m (Maybe (Text, Text)) #

Lookup basic authentication data from Authorization header of request. Returns user name and password

Since: yesod-core-1.4.9

lookupHeaders :: MonadHandler m => CI ByteString -> m [ByteString] #

Lookup a request header.

Since: yesod-core-1.2.2

lookupHeader :: MonadHandler m => CI ByteString -> m (Maybe ByteString) #

Lookup a request header.

Since: yesod-core-1.2.2

languages :: MonadHandler m => m [Text] #

Get the list of supported languages supplied by the user.

Languages are determined based on the following (in descending order of preference):

  • The _LANG get parameter.
  • The _LANG user session variable.
  • The _LANG cookie.
  • Accept-Language HTTP header.

Yesod will seek the first language from the returned list matched with languages supporting by your application. This language will be used to render i18n templates. If a matching language is not found the default language will be used.

This is handled by parseWaiRequest (not exposed).

NOTE: Before version 1.6.19.0, this function prioritized the session variable above all other sources.

cacheBySet :: (MonadHandler m, Typeable a) => ByteString -> a -> m () #

Sets a value in the cache used by cachedBy.

Since: yesod-core-1.6.10

cacheByGet :: (MonadHandler m, Typeable a) => ByteString -> m (Maybe a) #

Retrieves a value from the cache used by cachedBy.

Since: yesod-core-1.6.10

cachedBy :: (MonadHandler m, Typeable a) => ByteString -> m a -> m a #

a per-request cache. just like cached. cached can only cache a single value per type. cachedBy stores multiple values per type by usage of a ByteString key

cached is ideal to cache an action that has only one value of a type, such as the session's current user cachedBy is required if the action has parameters and can return multiple values per type. You can turn those parameters into a ByteString cache key. For example, caching a lookup of a Link by a token where multiple token lookups might be performed.

Since: yesod-core-1.4.0

cacheSet :: (MonadHandler m, Typeable a) => a -> m () #

Sets a value in the cache used by cached.

Since: yesod-core-1.6.10

cacheGet :: (MonadHandler m, Typeable a) => m (Maybe a) #

Retrieves a value from the cache used by cached.

Since: yesod-core-1.6.10

cached :: (MonadHandler m, Typeable a) => m a -> m a #

Use a per-request cache to avoid performing the same action multiple times. Values are stored by their type, the result of typeOf from Typeable. Therefore, you should use different newtype wrappers at each cache site.

For example, yesod-auth uses an un-exported newtype, CachedMaybeAuth and exports functions that utilize it such as maybeAuth. This means that another module can create its own newtype wrapper to cache the same type from a different action without any cache conflicts.

See the original announcement: http://www.yesodweb.com/blog/2013/03/yesod-1-2-cleaner-internals

Since: yesod-core-1.2.0

getMessageRender :: (MonadHandler m, RenderMessage (HandlerSite m) message) => m (message -> Text) #

waiRequest :: MonadHandler m => m Request #

Get the request's Request value.

withUrlRenderer :: MonadHandler m => ((Route (HandlerSite m) -> [(Text, Text)] -> Text) -> output) -> m output #

Provide a URL rendering function to the given function and return the result. Useful for processing Shakespearean templates.

Since: yesod-core-1.2.20

giveUrlRenderer :: MonadHandler m => ((Route (HandlerSite m) -> [(Text, Text)] -> Text) -> output) -> m output #

Deprecated synonym for withUrlRenderer.

Since: yesod-core-1.2.0

hamletToRepHtml :: MonadHandler m => HtmlUrl (Route (HandlerSite m)) -> m Html #

Wraps the Content generated by hamletToContent in a RepHtml.

redirectToPost :: (MonadHandler m, RedirectUrl (HandlerSite m) url) => url -> m a #

Redirect to a POST resource.

This is not technically a redirect; instead, it returns an HTML page with a POST form, and some Javascript to automatically submit the form. This can be useful when you need to post a plain link somewhere that needs to cause changes on the server.

newIdent :: MonadHandler m => m Text #

Get a unique identifier.

getSession :: MonadHandler m => m SessionMap #

Get all session variables.

lookupSessionBS :: MonadHandler m => Text -> m (Maybe ByteString) #

Lookup for session data in binary format.

lookupSession :: MonadHandler m => Text -> m (Maybe Text) #

Lookup for session data.

clearSession :: MonadHandler m => m () #

Clear all session variables.

@since: 1.0.1

deleteSession :: MonadHandler m => Text -> m () #

Unsets a session variable. See setSession.

setSessionBS :: MonadHandler m => Text -> ByteString -> m () #

Same as setSession, but uses binary data for the value.

setSession #

Arguments

:: MonadHandler m 
=> Text

key

-> Text

value

-> m () 

Set a variable in the user's session.

The session is handled by the clientsession package: it sets an encrypted and hashed cookie on the client. This ensures that all data is secure and not tampered with.

setWeakEtag :: MonadHandler m => Text -> m () #

Check the if-none-match header and, if it matches the given value, return a 304 not modified response. Otherwise, set the etag header to the given value.

A weak etag is only expected to be semantically identical to the prior content, but doesn't have to be byte-for-byte identical. Therefore it can be useful for dynamically generated content that may be difficult to perform bytewise hashing upon.

Note that it is the responsibility of the caller to ensure that the provided value is a valid etag value, no sanity checking is performed by this function.

Since: yesod-core-1.4.37

setEtag :: MonadHandler m => Text -> m () #

Check the if-none-match header and, if it matches the given value, return a 304 not modified response. Otherwise, set the etag header to the given value.

Note that it is the responsibility of the caller to ensure that the provided value is a valid etag value, no sanity checking is performed by this function.

Since: yesod-core-1.4.4

expiresAt :: MonadHandler m => UTCTime -> m () #

Set an Expires header to the given date.

alreadyExpired :: MonadHandler m => m () #

Set an Expires header in the past, meaning this content should not be cached.

neverExpires :: MonadHandler m => m () #

Set the Expires header to some date in 2037. In other words, this content is never (realistically) expired.

cacheSeconds :: MonadHandler m => Int -> m () #

Set the Cache-Control header to indicate this response should be cached for the given number of seconds.

replaceOrAddHeader :: MonadHandler m => Text -> Text -> m () #

Replace an existing header with a new value or add a new header if not present.

Note that, while the data type used here is Text, you must provide only ASCII value to be HTTP compliant.

Since: yesod-core-1.4.36

setHeader :: MonadHandler m => Text -> Text -> m () #

Deprecated synonym for addHeader.

addHeader :: MonadHandler m => Text -> Text -> m () #

Set an arbitrary response header.

Note that, while the data type used here is Text, you must provide only ASCII value to be HTTP compliant.

Since: yesod-core-1.2.0

addContentDispositionFileName :: MonadHandler m => Text -> m () #

Set attachment file name.

Allows Unicode characters by encoding to UTF-8. Some modurn browser parse UTF-8 characters with out encoding setting. But, for example IE9 can't parse UTF-8 characters. This function use RFC 6266(RFC 5987)

Since: yesod-core-1.6.4

setLanguage :: MonadHandler m => Text -> m () #

Set the language in the user session. Will show up in languages on the next request.

deleteCookie #

Arguments

:: MonadHandler m 
=> Text

key

-> Text

path

-> m () 

Unset the cookie on the client.

Note: although the value used for key and path is Text, you should only use ASCII values to be HTTP compliant.

getExpires #

Arguments

:: MonadIO m 
=> Int

minutes

-> m UTCTime 

Helper function for setCookieExpires value

setCookie :: MonadHandler m => SetCookie -> m () #

Set the cookie on the client.

invalidArgsI :: (MonadHandler m, RenderMessage (HandlerSite m) msg) => [msg] -> m a #

Return a 400 invalid arguments page.

invalidArgs :: MonadHandler m => [Text] -> m a #

Return a 400 invalid arguments page.

permissionDeniedI :: (RenderMessage (HandlerSite m) msg, MonadHandler m) => msg -> m a #

Return a 403 permission denied page.

permissionDenied :: MonadHandler m => Text -> m a #

Return a 403 permission denied page.

notAuthenticated :: MonadHandler m => m a #

Return a 401 status code

badMethod :: MonadHandler m => m a #

Return a 405 method not supported page.

notFound :: MonadHandler m => m a #

Return a 404 not found page. Also denotes no handler available.

notModified :: MonadHandler m => m a #

Send a 304 not modified response immediately. This is a short-circuiting action.

Since: yesod-core-1.4.4

sendRawResponse :: (MonadHandler m, MonadUnliftIO m) => (ConduitT () ByteString IO () -> ConduitT ByteString Void IO () -> m ()) -> m a #

Send a raw response. This is used for cases such as WebSockets. Requires WAI 2.1 or later, and a web server which supports raw responses (e.g., Warp).

Since: yesod-core-1.2.7

sendRawResponseNoConduit :: (MonadHandler m, MonadUnliftIO m) => (IO ByteString -> (ByteString -> IO ()) -> m ()) -> m a #

Send a raw response without conduit. This is used for cases such as WebSockets. Requires WAI 3.0 or later, and a web server which supports raw responses (e.g., Warp).

Since: yesod-core-1.2.16

sendWaiApplication :: MonadHandler m => Application -> m b #

Switch over to handling the current request with a WAI Application.

Since: yesod-core-1.2.17

sendWaiResponse :: MonadHandler m => Response -> m b #

Send a Response. Please note: this function is rarely necessary, and will disregard any changes to response headers and session that you have already specified. This function short-circuits. It should be considered only for very specific needs. If you are not sure if you need it, you don't.

sendResponseNoContent :: MonadHandler m => m a #

Bypass remaining handler code and output no content with a 204 status code.

Since: yesod-core-1.6.9

sendResponseCreated :: MonadHandler m => Route (HandlerSite m) -> m a #

Send a 201 Created response with the given route as the Location response header.

sendStatusJSON :: (MonadHandler m, ToJSON c) => Status -> c -> m a #

Bypass remaining handler code and output the given JSON with the given status code.

Since: yesod-core-1.4.18

sendResponseStatus :: (MonadHandler m, ToTypedContent c) => Status -> c -> m a #

Bypass remaining handler code and output the given content with the given status code.

sendResponse :: (MonadHandler m, ToTypedContent c) => c -> m a #

Bypass remaining handler code and output the given content with a 200 status code.

sendFilePart #

Arguments

:: MonadHandler m 
=> ContentType 
-> FilePath 
-> Integer

offset

-> Integer

count

-> m a 

Same as sendFile, but only sends part of a file.

sendFile :: MonadHandler m => ContentType -> FilePath -> m a #

Bypass remaining handler code and output the given file.

For some backends, this is more efficient than reading in the file to memory, since they can optimize file sending via a system call to sendfile.

getMessage :: MonadHandler m => m (Maybe Html) #

Gets just the last message in the user's session, discards the rest and the status

setMessageI :: (MonadHandler m, RenderMessage (HandlerSite m) msg) => msg -> m () #

Calls addMessageI with an empty status

setMessage :: MonadHandler m => Html -> m () #

Calls addMessage with an empty status

getMessages :: MonadHandler m => m [(Text, Html)] #

Gets all messages in the user's session, and then clears the variable.

See addMessage.

Since: yesod-core-1.4.20

addMessageI :: (MonadHandler m, RenderMessage (HandlerSite m) msg) => Text -> msg -> m () #

Adds a message in the user's session but uses RenderMessage to allow for i18n

See getMessages.

Since: yesod-core-1.4.20

addMessage #

Arguments

:: MonadHandler m 
=> Text

status

-> Html

message

-> m () 

Adds a status and message in the user's session.

See getMessages.

Since: yesod-core-1.4.20

clearUltDest :: MonadHandler m => m () #

Remove a previously set ultimate destination. See setUltDest.

redirectUltDest #

Arguments

:: (RedirectUrl (HandlerSite m) url, MonadHandler m) 
=> url

default destination if nothing in session

-> m a 

Redirect to the ultimate destination in the user's session. Clear the value from the session.

The ultimate destination is set with setUltDest.

This function uses redirect, and thus will perform a temporary redirect to a GET request.

setUltDestReferer :: MonadHandler m => m () #

Sets the ultimate destination to the referer request header, if present.

This function will not overwrite an existing ultdest.

setUltDestCurrent :: MonadHandler m => m () #

Same as setUltDest, but uses the current page.

If this is a 404 handler, there is no current page, and then this call does nothing.

setUltDest :: (MonadHandler m, RedirectUrl (HandlerSite m) url) => url -> m () #

Sets the ultimate destination variable to the given route.

An ultimate destination is stored in the user session and can be loaded later by redirectUltDest.

redirectWith :: (MonadHandler m, RedirectUrl (HandlerSite m) url) => Status -> url -> m a #

Redirect to the given URL with the specified status code.

redirect :: (MonadHandler m, RedirectUrl (HandlerSite m) url) => url -> m a #

Redirect to the given route. HTTP status code 303 for HTTP 1.1 clients and 302 for HTTP 1.0 This is the appropriate choice for a get-following-post technique, which should be the usual use case.

If you want direct control of the final status code, or need a different status code, please use redirectWith.

forkHandler #

Arguments

:: (SomeException -> HandlerFor site ())

error handler

-> HandlerFor site () 
-> HandlerFor site () 

forkIO for a Handler (run an action in the background)

Uses handlerToIO, liftResourceT, and resourceForkIO for correctness and efficiency

Since: yesod-core-1.2.8

handlerToIO :: MonadIO m => HandlerFor site (HandlerFor site a -> m a) #

Returns a function that runs HandlerFor actions inside IO.

Sometimes you want to run an inner HandlerFor action outside the control flow of an HTTP request (on the outer HandlerFor action). For example, you may want to spawn a new thread:

getFooR :: Handler RepHtml
getFooR = do
  runInnerHandler <- handlerToIO
  liftIO $ forkIO $ runInnerHandler $ do
    Code here runs inside HandlerFor but on a new thread.
    This is the inner HandlerFor.
    ...
  Code here runs inside the request's control flow.
  This is the outer HandlerFor.
  ...

Another use case for this function is creating a stream of server-sent events using HandlerFor actions (see yesod-eventsource).

Most of the environment from the outer HandlerFor is preserved on the inner HandlerFor, however:

  • The request body is cleared (otherwise it would be very difficult to prevent huge memory leaks).
  • The cache is cleared (see cached).

Changes to the response made inside the inner HandlerFor are ignored (e.g., session variables, cookies, response headers). This allows the inner HandlerFor to outlive the outer HandlerFor (e.g., on the forkIO example above, a response may be sent to the client without killing the new thread).

getCurrentRoute :: MonadHandler m => m (Maybe (Route (HandlerSite m))) #

Get the route requested by the user. If this is a 404 response- where the user requested an invalid route- this function will return Nothing.

getPostParams :: MonadHandler m => m [(Text, Text)] #

Get all the post parameters passed to the handler. To also get the submitted files (if any), you have to use runRequestBody instead of this function.

Since: yesod-core-1.4.33

getUrlRenderParams :: MonadHandler m => m (Route (HandlerSite m) -> [(Text, Text)] -> Text) #

The URL rendering function with query-string parameters.

getUrlRender :: MonadHandler m => m (Route (HandlerSite m) -> Text) #

Get the URL rendering function.

getsYesod :: MonadHandler m => (HandlerSite m -> a) -> m a #

Get a specific component of the master site application argument. Analogous to the gets function for operating on StateT.

getYesod :: MonadHandler m => m (HandlerSite m) #

Get the master site application argument.

type HandlerT site (m :: Type -> Type) = HandlerFor site #

class RedirectUrl master a where #

Some value which can be turned into a URL for redirects.

Methods

toTextUrl :: (MonadHandler m, HandlerSite m ~ master) => a -> m Text #

Converts the value to the URL and a list of query-string parameters.

Instances

Instances details
RedirectUrl master Text 
Instance details

Defined in Yesod.Core.Handler

Methods

toTextUrl :: (MonadHandler m, HandlerSite m ~ master) => Text -> m Text #

RedirectUrl master String 
Instance details

Defined in Yesod.Core.Handler

Methods

toTextUrl :: (MonadHandler m, HandlerSite m ~ master) => String -> m Text #

RedirectUrl master (Route master) 
Instance details

Defined in Yesod.Core.Handler

Methods

toTextUrl :: (MonadHandler m, HandlerSite m ~ master) => Route master -> m Text #

(RedirectUrl master a, PathPiece b) => RedirectUrl master (Fragment a b) 
Instance details

Defined in Yesod.Core.Handler

Methods

toTextUrl :: (MonadHandler m, HandlerSite m ~ master) => Fragment a b -> m Text #

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

(key ~ Text, val ~ Text) => RedirectUrl master (Route master, [(key, val)]) 
Instance details

Defined in Yesod.Core.Handler

Methods

toTextUrl :: (MonadHandler m, HandlerSite m ~ master) => (Route master, [(key, val)]) -> m Text #

data Fragment a b #

Add a fragment identifier to a route to be used when redirecting. For example:

redirect (NewsfeedR :#: storyId)

@since 1.2.9.

Constructors

a :#: b 

Instances

Instances details
(RedirectUrl master a, PathPiece b) => RedirectUrl master (Fragment a b) 
Instance details

Defined in Yesod.Core.Handler

Methods

toTextUrl :: (MonadHandler m, HandlerSite m ~ master) => Fragment a b -> m Text #

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

data ProvidedRep (m :: Type -> Type) #

Internal representation of a single provided representation.

Since: yesod-core-1.2.0

type family SubHandlerSite (m :: Type -> Type) #

Instances

Instances details
type SubHandlerSite (ListT m) 
Instance details

Defined in Yesod.Core.Class.Handler

type SubHandlerSite (MaybeT m) 
Instance details

Defined in Yesod.Core.Class.Handler

type SubHandlerSite (HandlerFor site) 
Instance details

Defined in Yesod.Core.Class.Handler

type SubHandlerSite (HandlerFor site) = site
type SubHandlerSite (WidgetFor site) 
Instance details

Defined in Yesod.Core.Class.Handler

type SubHandlerSite (WidgetFor site) = site
type SubHandlerSite (ExceptT e m) 
Instance details

Defined in Yesod.Core.Class.Handler

type SubHandlerSite (IdentityT m) 
Instance details

Defined in Yesod.Core.Class.Handler

type SubHandlerSite (ReaderT r m) 
Instance details

Defined in Yesod.Core.Class.Handler

type SubHandlerSite (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 SubHandlerSite (WriterT w m) 
Instance details

Defined in Yesod.Core.Class.Handler

type SubHandlerSite (WriterT w m) 
Instance details

Defined in Yesod.Core.Class.Handler

type SubHandlerSite (SubHandlerFor sub master) 
Instance details

Defined in Yesod.Core.Class.Handler

type SubHandlerSite (SubHandlerFor sub master) = sub
type SubHandlerSite (ConduitM i o m) 
Instance details

Defined in Yesod.Core.Class.Handler

type SubHandlerSite (RWST r w s m) 
Instance details

Defined in Yesod.Core.Class.Handler

type SubHandlerSite (RWST r w s m) 
Instance details

Defined in Yesod.Core.Class.Handler

type SubHandlerSite (Pipe l i o u m) 
Instance details

Defined in Yesod.Core.Class.Handler

type SubHandlerSite (Pipe l i o u m) = SubHandlerSite m

type family HandlerSite (m :: Type -> Type) #

Instances

Instances details
type HandlerSite (ListT m) 
Instance details

Defined in Yesod.Core.Class.Handler

type HandlerSite (MaybeT m) 
Instance details

Defined in Yesod.Core.Class.Handler

type HandlerSite (HandlerFor site) 
Instance details

Defined in Yesod.Core.Class.Handler

type HandlerSite (HandlerFor site) = site
type HandlerSite (WidgetFor site) 
Instance details

Defined in Yesod.Core.Class.Handler

type HandlerSite (WidgetFor site) = site
type HandlerSite (ExceptT e m) 
Instance details

Defined in Yesod.Core.Class.Handler

type HandlerSite (IdentityT m) 
Instance details

Defined in Yesod.Core.Class.Handler

type HandlerSite (ReaderT r m) 
Instance details

Defined in Yesod.Core.Class.Handler

type HandlerSite (StateT s m) 
Instance details

Defined in Yesod.Core.Class.Handler

type HandlerSite (StateT s m) 
Instance details

Defined in Yesod.Core.Class.Handler

type HandlerSite (WriterT w m) 
Instance details

Defined in Yesod.Core.Class.Handler

type HandlerSite (WriterT w m) 
Instance details

Defined in Yesod.Core.Class.Handler

type HandlerSite (SubHandlerFor sub master) 
Instance details

Defined in Yesod.Core.Class.Handler

type HandlerSite (SubHandlerFor sub master) = master
type HandlerSite (ConduitM i o m) 
Instance details

Defined in Yesod.Core.Class.Handler

type HandlerSite (RWST r w s m) 
Instance details

Defined in Yesod.Core.Class.Handler

type HandlerSite (RWST r w s m) = HandlerSite m
type HandlerSite (RWST r w s m) 
Instance details

Defined in Yesod.Core.Class.Handler

type HandlerSite (RWST r w s m) = HandlerSite m
type HandlerSite (Pipe l i o u m) 
Instance details

Defined in Yesod.Core.Class.Handler

type HandlerSite (Pipe l i o u m) = HandlerSite m

class (MonadResource m, MonadLogger m) => MonadHandler (m :: Type -> Type) where #

Associated Types

type HandlerSite (m :: Type -> Type) #

type SubHandlerSite (m :: Type -> Type) #

Instances

Instances details
MonadHandler m => MonadHandler (ListT m) 
Instance details

Defined in Yesod.Core.Class.Handler

Associated Types

type HandlerSite (ListT m) #

type SubHandlerSite (ListT m) #

MonadHandler m => MonadHandler (MaybeT m) 
Instance details

Defined in Yesod.Core.Class.Handler

Associated Types

type HandlerSite (MaybeT m) #

type SubHandlerSite (MaybeT m) #

MonadHandler (HandlerFor site) 
Instance details

Defined in Yesod.Core.Class.Handler

Associated Types

type HandlerSite (HandlerFor site) #

type SubHandlerSite (HandlerFor site) #

MonadHandler (WidgetFor site) 
Instance details

Defined in Yesod.Core.Class.Handler

Associated Types

type HandlerSite (WidgetFor site) #

type SubHandlerSite (WidgetFor site) #

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

MonadHandler m => MonadHandler (IdentityT m) 
Instance details

Defined in Yesod.Core.Class.Handler

Associated Types

type HandlerSite (IdentityT m) #

type SubHandlerSite (IdentityT m) #

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

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

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

(Monoid w, MonadHandler m) => MonadHandler (WriterT w m) 
Instance details

Defined in Yesod.Core.Class.Handler

Associated Types

type HandlerSite (WriterT w m) #

type SubHandlerSite (WriterT w m) #

(Monoid w, MonadHandler m) => MonadHandler (WriterT w m) 
Instance details

Defined in Yesod.Core.Class.Handler

Associated Types

type HandlerSite (WriterT w m) #

type SubHandlerSite (WriterT w m) #

MonadHandler (SubHandlerFor sub master) 
Instance details

Defined in Yesod.Core.Class.Handler

Associated Types

type HandlerSite (SubHandlerFor sub master) #

type SubHandlerSite (SubHandlerFor sub master) #

Methods

liftHandler :: HandlerFor (HandlerSite (SubHandlerFor sub master)) a -> SubHandlerFor sub master a #

liftSubHandler :: SubHandlerFor (SubHandlerSite (SubHandlerFor sub master)) (HandlerSite (SubHandlerFor sub master)) a -> SubHandlerFor sub master a #

MonadHandler m => MonadHandler (ConduitM i o m) 
Instance details

Defined in Yesod.Core.Class.Handler

Associated Types

type HandlerSite (ConduitM i o m) #

type SubHandlerSite (ConduitM i o m) #

(Monoid w, MonadHandler m) => MonadHandler (RWST r w s m) 
Instance details

Defined in Yesod.Core.Class.Handler

Associated Types

type HandlerSite (RWST r w s m) #

type SubHandlerSite (RWST r w s m) #

Methods

liftHandler :: HandlerFor (HandlerSite (RWST r w s m)) a -> RWST r w s m a #

liftSubHandler :: SubHandlerFor (SubHandlerSite (RWST r w s m)) (HandlerSite (RWST r w s m)) a -> RWST r w s m a #

(Monoid w, MonadHandler m) => MonadHandler (RWST r w s m) 
Instance details

Defined in Yesod.Core.Class.Handler

Associated Types

type HandlerSite (RWST r w s m) #

type SubHandlerSite (RWST r w s m) #

Methods

liftHandler :: HandlerFor (HandlerSite (RWST r w s m)) a -> RWST r w s m a #

liftSubHandler :: SubHandlerFor (SubHandlerSite (RWST r w s m)) (HandlerSite (RWST r w s m)) a -> RWST r w s m a #

MonadHandler m => MonadHandler (Pipe l i o u m) 
Instance details

Defined in Yesod.Core.Class.Handler

Associated Types

type HandlerSite (Pipe l i o u m) #

type SubHandlerSite (Pipe l i o u m) #

Methods

liftHandler :: HandlerFor (HandlerSite (Pipe l i o u m)) a -> Pipe l i o u m a #

liftSubHandler :: SubHandlerFor (SubHandlerSite (Pipe l i o u m)) (HandlerSite (Pipe l i o u m)) a -> Pipe l i o u m a #

class MonadHandler m => MonadWidget (m :: Type -> Type) where #

Methods

liftWidget :: WidgetFor (HandlerSite m) a -> m a #

Instances

Instances details
MonadWidget m => MonadWidget (ListT m) 
Instance details

Defined in Yesod.Core.Class.Handler

Methods

liftWidget :: WidgetFor (HandlerSite (ListT m)) a -> ListT m a #

MonadWidget m => MonadWidget (MaybeT m) 
Instance details

Defined in Yesod.Core.Class.Handler

Methods

liftWidget :: WidgetFor (HandlerSite (MaybeT m)) a -> MaybeT m a #

MonadWidget (WidgetFor site) 
Instance details

Defined in Yesod.Core.Class.Handler

Methods

liftWidget :: WidgetFor (HandlerSite (WidgetFor site)) a -> WidgetFor site a #

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 #

MonadWidget m => MonadWidget (IdentityT m) 
Instance details

Defined in Yesod.Core.Class.Handler

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 #

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 #

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 #

(Monoid w, MonadWidget m) => MonadWidget (WriterT w m) 
Instance details

Defined in Yesod.Core.Class.Handler

Methods

liftWidget :: WidgetFor (HandlerSite (WriterT w m)) a -> WriterT w m a #

(Monoid w, MonadWidget m) => MonadWidget (WriterT w m) 
Instance details

Defined in Yesod.Core.Class.Handler

Methods

liftWidget :: WidgetFor (HandlerSite (WriterT w m)) a -> WriterT w m a #

MonadWidget m => MonadWidget (ConduitM i o m) 
Instance details

Defined in Yesod.Core.Class.Handler

Methods

liftWidget :: WidgetFor (HandlerSite (ConduitM i o m)) a -> ConduitM i o m a #

(Monoid w, MonadWidget m) => MonadWidget (RWST r w s m) 
Instance details

Defined in Yesod.Core.Class.Handler

Methods

liftWidget :: WidgetFor (HandlerSite (RWST r w s m)) a -> RWST r w s m a #

(Monoid w, MonadWidget m) => MonadWidget (RWST r w s m) 
Instance details

Defined in Yesod.Core.Class.Handler

Methods

liftWidget :: WidgetFor (HandlerSite (RWST r w s m)) a -> RWST r w s m a #

MonadWidget m => MonadWidget (Pipe l i o u m) 
Instance details

Defined in Yesod.Core.Class.Handler

Methods

liftWidget :: WidgetFor (HandlerSite (Pipe l i o u m)) a -> Pipe l i o u m a #

contentTypeTypes :: ContentType -> (ByteString, ByteString) #

Give just the media types as a pair.

For example, "text/html; charset=utf-8" returns ("text", "html")

simpleContentType :: ContentType -> ContentType #

Removes "extra" information at the end of a content type string. In particular, removes everything after the semicolon, if present.

For example, "text/html; charset=utf-8" is commonly used to specify the character encoding for HTML data. This function would return "text/html".

repXml :: ToContent a => a -> RepXml #

repJson :: ToContent a => a -> RepJson #

emptyContent :: Content #

Zero-length enumerator.

class ToContent a where #

Anything which can be converted into Content. Most of the time, you will want to use the ContentBuilder constructor. An easier approach will be to use a pre-defined toContent function, such as converting your data into a lazy bytestring and then calling toContent on that.

Please note that the built-in instances for lazy data structures (String, lazy ByteString, lazy Text and Html) will not automatically include the content length for the ContentBuilder constructor.

Methods

toContent :: a -> Content #

Instances

Instances details
ToContent Encoding 
Instance details

Defined in Yesod.Core.Content

ToContent Value 
Instance details

Defined in Yesod.Core.Content

Methods

toContent :: Value -> Content #

ToContent Void 
Instance details

Defined in Yesod.Core.Content

Methods

toContent :: Void -> Content #

ToContent Html 
Instance details

Defined in Yesod.Core.Content

Methods

toContent :: Html -> Content #

ToContent Builder 
Instance details

Defined in Yesod.Core.Content

Methods

toContent :: Builder -> Content #

ToContent ByteString 
Instance details

Defined in Yesod.Core.Content

ToContent ByteString 
Instance details

Defined in Yesod.Core.Content

ToContent Css 
Instance details

Defined in Yesod.Core.Content

Methods

toContent :: Css -> Content #

ToContent Javascript 
Instance details

Defined in Yesod.Core.Content

ToContent Text 
Instance details

Defined in Yesod.Core.Content

Methods

toContent :: Text -> Content #

ToContent Text 
Instance details

Defined in Yesod.Core.Content

Methods

toContent :: Text -> Content #

ToContent Content 
Instance details

Defined in Yesod.Core.Content

Methods

toContent :: Content -> Content #

ToContent RepJson 
Instance details

Defined in Yesod.Core.Content

Methods

toContent :: RepJson -> Content #

ToContent RepPlain 
Instance details

Defined in Yesod.Core.Content

ToContent RepXml 
Instance details

Defined in Yesod.Core.Content

Methods

toContent :: RepXml -> Content #

ToContent TypedContent 
Instance details

Defined in Yesod.Core.Content

ToContent String 
Instance details

Defined in Yesod.Core.Content

Methods

toContent :: String -> Content #

ToContent () 
Instance details

Defined in Yesod.Core.Content

Methods

toContent :: () -> Content #

ToContent a => ToContent (DontFullyEvaluate a) 
Instance details

Defined in Yesod.Core.Content

ToContent (JSONResponse a) 
Instance details

Defined in Yesod.Core.Content

ToContent (Maybe SwapHash) Source # 
Instance details

Defined in BtcLsp.Data.Type

ToContent (ContentType, Content) 
Instance details

Defined in Yesod.Core.Content

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 #

class ToFlushBuilder a where #

A class for all data which can be sent in a streaming response. Note that for textual data, instances must use UTF-8 encoding.

Since 1.2.0

Methods

toFlushBuilder :: a -> Flush Builder #

Instances

Instances details
ToFlushBuilder Html 
Instance details

Defined in Yesod.Core.Content

ToFlushBuilder Builder 
Instance details

Defined in Yesod.Core.Content

ToFlushBuilder ByteString 
Instance details

Defined in Yesod.Core.Content

ToFlushBuilder ByteString 
Instance details

Defined in Yesod.Core.Content

ToFlushBuilder Text 
Instance details

Defined in Yesod.Core.Content

ToFlushBuilder Text 
Instance details

Defined in Yesod.Core.Content

ToFlushBuilder String 
Instance details

Defined in Yesod.Core.Content

ToFlushBuilder (Flush Html) 
Instance details

Defined in Yesod.Core.Content

ToFlushBuilder (Flush Builder) 
Instance details

Defined in Yesod.Core.Content

ToFlushBuilder (Flush ByteString) 
Instance details

Defined in Yesod.Core.Content

ToFlushBuilder (Flush ByteString) 
Instance details

Defined in Yesod.Core.Content

ToFlushBuilder (Flush Text) 
Instance details

Defined in Yesod.Core.Content

ToFlushBuilder (Flush Text) 
Instance details

Defined in Yesod.Core.Content

ToFlushBuilder (Flush String) 
Instance details

Defined in Yesod.Core.Content

class ToTypedContent a => HasContentType a where #

Methods

getContentType :: Monad m => m a -> ContentType #

Instances

Instances details
HasContentType Encoding 
Instance details

Defined in Yesod.Core.Content

HasContentType Value 
Instance details

Defined in Yesod.Core.Content

Methods

getContentType :: Monad m => m Value -> ContentType #

HasContentType Html 
Instance details

Defined in Yesod.Core.Content

Methods

getContentType :: Monad m => m Html -> ContentType #

HasContentType Css 
Instance details

Defined in Yesod.Core.Content

Methods

getContentType :: Monad m => m Css -> ContentType #

HasContentType Javascript 
Instance details

Defined in Yesod.Core.Content

HasContentType Text 
Instance details

Defined in Yesod.Core.Content

Methods

getContentType :: Monad m => m Text -> ContentType #

HasContentType Text 
Instance details

Defined in Yesod.Core.Content

Methods

getContentType :: Monad m => m Text -> ContentType #

HasContentType RepJson 
Instance details

Defined in Yesod.Core.Content

HasContentType RepPlain 
Instance details

Defined in Yesod.Core.Content

HasContentType RepXml 
Instance details

Defined in Yesod.Core.Content

HasContentType a => HasContentType (DontFullyEvaluate a) 
Instance details

Defined in Yesod.Core.Content

HasContentType (JSONResponse a) 
Instance details

Defined in Yesod.Core.Content

class ToContent a => ToTypedContent a where #

Any type which can be converted to TypedContent.

Since 1.2.0

Instances

Instances details
ToTypedContent Encoding 
Instance details

Defined in Yesod.Core.Content

ToTypedContent Value 
Instance details

Defined in Yesod.Core.Content

ToTypedContent Void 
Instance details

Defined in Yesod.Core.Content

ToTypedContent Html 
Instance details

Defined in Yesod.Core.Content

ToTypedContent Css 
Instance details

Defined in Yesod.Core.Content

ToTypedContent Javascript 
Instance details

Defined in Yesod.Core.Content

ToTypedContent Text 
Instance details

Defined in Yesod.Core.Content

ToTypedContent Text 
Instance details

Defined in Yesod.Core.Content

ToTypedContent RepJson 
Instance details

Defined in Yesod.Core.Content

ToTypedContent RepPlain 
Instance details

Defined in Yesod.Core.Content

ToTypedContent RepXml 
Instance details

Defined in Yesod.Core.Content

ToTypedContent TypedContent 
Instance details

Defined in Yesod.Core.Content

ToTypedContent () 
Instance details

Defined in Yesod.Core.Content

Methods

toTypedContent :: () -> TypedContent #

ToTypedContent a => ToTypedContent (DontFullyEvaluate a) 
Instance details

Defined in Yesod.Core.Content

ToTypedContent (JSONResponse a) 
Instance details

Defined in Yesod.Core.Content

ToTypedContent (Maybe SwapHash) Source # 
Instance details

Defined in BtcLsp.Data.Type

ToTypedContent [Char] 
Instance details

Defined in Yesod.Core.Content

ToTypedContent (ContentType, Content) 
Instance details

Defined in Yesod.Core.Content

clientSessionDateCacher #

Arguments

:: NominalDiffTime

Inactive session validity.

-> IO (IO ClientSessionDateCache, IO ()) 

newtype SessionBackend #

Constructors

SessionBackend 

Fields

data YesodRequest #

The parsed request information. This type augments the standard WAI Request with additional information.

Constructors

YesodRequest 

Fields

type RequestBodyContents = ([(Text, Text)], [(Text, FileInfo)]) #

A tuple containing both the POST parameters and submitted files.

data FileInfo #

data Approot master #

How to determine the root of the application for constructing URLs.

Note that future versions of Yesod may add new constructors without bumping the major version number. As a result, you should not pattern match on Approot values.

Constructors

ApprootRelative

No application root.

ApprootStatic !Text 
ApprootMaster !(master -> Text) 
ApprootRequest !(master -> Request -> Text) 

data AuthResult #

Instances

Instances details
Read AuthResult 
Instance details

Defined in Yesod.Core.Types

Show AuthResult 
Instance details

Defined in Yesod.Core.Types

Eq AuthResult 
Instance details

Defined in Yesod.Core.Types

type BottomOfHeadAsync master #

Arguments

 = [Text]

urls to load asynchronously

-> Maybe (HtmlUrl (Route master))

widget of js to run on async completion

-> HtmlUrl (Route master)

widget to insert at the bottom of head

type Texts = [Text] #

newtype WaiSubsite #

Wrap up a normal WAI application as a Yesod subsite. Ignore parent site's middleware and isAuthorized.

Constructors

WaiSubsite 

Instances

Instances details
ParseRoute WaiSubsite 
Instance details

Defined in Yesod.Core.Types

Methods

parseRoute :: ([Text], [(Text, Text)]) -> Maybe (Route WaiSubsite) #

RenderRoute WaiSubsite 
Instance details

Defined in Yesod.Core.Types

Associated Types

data Route WaiSubsite #

Methods

renderRoute :: Route WaiSubsite -> ([Text], [(Text, Text)]) #

YesodSubDispatch WaiSubsite master 
Instance details

Defined in Yesod.Core.Class.Dispatch

Read (Route WaiSubsite) 
Instance details

Defined in Yesod.Core.Types

Show (Route WaiSubsite) 
Instance details

Defined in Yesod.Core.Types

Eq (Route WaiSubsite) 
Instance details

Defined in Yesod.Core.Types

Ord (Route WaiSubsite) 
Instance details

Defined in Yesod.Core.Types

data Route WaiSubsite 
Instance details

Defined in Yesod.Core.Types

newtype WaiSubsiteWithAuth #

Like WaiSubsite, but applies parent site's middleware and isAuthorized.

Since: yesod-core-1.4.34

Instances

Instances details
ParseRoute WaiSubsiteWithAuth 
Instance details

Defined in Yesod.Core.Types

RenderRoute WaiSubsiteWithAuth 
Instance details

Defined in Yesod.Core.Types

Associated Types

data Route WaiSubsiteWithAuth #

YesodSubDispatch WaiSubsiteWithAuth master 
Instance details

Defined in Yesod.Core.Class.Dispatch

Read (Route WaiSubsiteWithAuth) 
Instance details

Defined in Yesod.Core.Types

Show (Route WaiSubsiteWithAuth) 
Instance details

Defined in Yesod.Core.Types

Eq (Route WaiSubsiteWithAuth) 
Instance details

Defined in Yesod.Core.Types

Ord (Route WaiSubsiteWithAuth) 
Instance details

Defined in Yesod.Core.Types

data Route WaiSubsiteWithAuth 
Instance details

Defined in Yesod.Core.Types

data HandlerFor site a #

A generic handler monad, which can have a different subsite and master site. We define a newtype for better error message.

Instances

Instances details
MonadIO (HandlerFor site) 
Instance details

Defined in Yesod.Core.Types

Methods

liftIO :: IO a -> HandlerFor site 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 #

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 #

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 #

MonadThrow (HandlerFor site) 
Instance details

Defined in Yesod.Core.Types

Methods

throwM :: Exception e => e -> HandlerFor site a #

MonadLogger (HandlerFor site) 
Instance details

Defined in Yesod.Core.Types

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> HandlerFor site () #

MonadLoggerIO (HandlerFor site) 
Instance details

Defined in Yesod.Core.Types

Methods

askLoggerIO :: HandlerFor site (Loc -> LogSource -> LogLevel -> LogStr -> IO ()) #

PrimMonad (HandlerFor site)

Since: yesod-core-1.6.7

Instance details

Defined in Yesod.Core.Types

Associated Types

type PrimState (HandlerFor site) #

Methods

primitive :: (State# (PrimState (HandlerFor site)) -> (# State# (PrimState (HandlerFor site)), a #)) -> HandlerFor site a #

MonadResource (HandlerFor site) 
Instance details

Defined in Yesod.Core.Types

Methods

liftResourceT :: ResourceT IO a -> HandlerFor site a #

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 #

MonadHandler (HandlerFor site) 
Instance details

Defined in Yesod.Core.Class.Handler

Associated Types

type HandlerSite (HandlerFor site) #

type SubHandlerSite (HandlerFor site) #

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 #

type PrimState (HandlerFor site) 
Instance details

Defined in Yesod.Core.Types

type HandlerSite (HandlerFor site) 
Instance details

Defined in Yesod.Core.Class.Handler

type HandlerSite (HandlerFor site) = site
type SubHandlerSite (HandlerFor site) 
Instance details

Defined in Yesod.Core.Class.Handler

type SubHandlerSite (HandlerFor site) = site

data WidgetFor site a #

A generic widget, allowing specification of both the subsite and master site datatypes. While this is simply a WriterT, we define a newtype for better error messages.

Instances

Instances details
(site' ~ site, a ~ ()) => ToWidget site' (WidgetFor site a) 
Instance details

Defined in Yesod.Core.Widget

Methods

toWidget :: (MonadWidget m, HandlerSite m ~ site') => WidgetFor site a -> m () #

MonadIO (WidgetFor site) 
Instance details

Defined in Yesod.Core.Types

Methods

liftIO :: IO a -> WidgetFor 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 #

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

MonadThrow (WidgetFor site) 
Instance details

Defined in Yesod.Core.Types

Methods

throwM :: Exception e => e -> WidgetFor site a #

MonadLogger (WidgetFor site) 
Instance details

Defined in Yesod.Core.Types

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> WidgetFor site () #

MonadLoggerIO (WidgetFor site) 
Instance details

Defined in Yesod.Core.Types

Methods

askLoggerIO :: WidgetFor site (Loc -> LogSource -> LogLevel -> LogStr -> IO ()) #

PrimMonad (WidgetFor site)

Since: yesod-core-1.6.7

Instance details

Defined in Yesod.Core.Types

Associated Types

type PrimState (WidgetFor site) #

Methods

primitive :: (State# (PrimState (WidgetFor site)) -> (# State# (PrimState (WidgetFor site)), a #)) -> WidgetFor site a #

MonadResource (WidgetFor site) 
Instance details

Defined in Yesod.Core.Types

Methods

liftResourceT :: ResourceT IO a -> WidgetFor site a #

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 #

MonadHandler (WidgetFor site) 
Instance details

Defined in Yesod.Core.Class.Handler

Associated Types

type HandlerSite (WidgetFor site) #

type SubHandlerSite (WidgetFor site) #

MonadWidget (WidgetFor site) 
Instance details

Defined in Yesod.Core.Class.Handler

Methods

liftWidget :: WidgetFor (HandlerSite (WidgetFor site)) a -> WidgetFor site 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 #

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 #

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 #

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 #

type PrimState (WidgetFor site) 
Instance details

Defined in Yesod.Core.Types

type HandlerSite (WidgetFor site) 
Instance details

Defined in Yesod.Core.Class.Handler

type HandlerSite (WidgetFor site) = site
type SubHandlerSite (WidgetFor site) 
Instance details

Defined in Yesod.Core.Class.Handler

type SubHandlerSite (WidgetFor site) = site

newtype CssBuilder #

Newtype wrapper allowing injection of arbitrary content into CSS.

Usage:

toWidget $ CssBuilder "p { color: red }"

Since: 1.1.3

Constructors

CssBuilder 

Instances

Instances details
ToWidget site CssBuilder 
Instance details

Defined in Yesod.Core.Widget

Methods

toWidget :: (MonadWidget m, HandlerSite m ~ site) => CssBuilder -> m () #

ToWidgetHead site CssBuilder 
Instance details

Defined in Yesod.Core.Widget

Methods

toWidgetHead :: (MonadWidget m, HandlerSite m ~ site) => CssBuilder -> m () #

ToWidgetMedia site CssBuilder 
Instance details

Defined in Yesod.Core.Widget

Methods

toWidgetMedia :: (MonadWidget m, HandlerSite m ~ site) => Text -> CssBuilder -> m () #

render ~ RY site => ToWidget site (render -> CssBuilder) 
Instance details

Defined in Yesod.Core.Widget

Methods

toWidget :: (MonadWidget m, HandlerSite m ~ site) => (render -> CssBuilder) -> m () #

render ~ RY site => ToWidgetHead site (render -> CssBuilder) 
Instance details

Defined in Yesod.Core.Widget

Methods

toWidgetHead :: (MonadWidget m, HandlerSite m ~ site) => (render -> CssBuilder) -> m () #

render ~ RY site => ToWidgetMedia site (render -> CssBuilder) 
Instance details

Defined in Yesod.Core.Widget

Methods

toWidgetMedia :: (MonadWidget m, HandlerSite m ~ site) => Text -> (render -> CssBuilder) -> m () #

data PageContent url #

Content for a web page. By providing this datatype, we can easily create generic site templates, which would have the type signature:

PageContent url -> HtmlUrl url

Constructors

PageContent 

Fields

data Content #

Constructors

ContentBuilder !Builder !(Maybe Int)

The content and optional content length.

ContentSource !(ConduitT () (Flush Builder) (ResourceT IO) ()) 
ContentFile !FilePath !(Maybe FilePart) 
ContentDontEvaluate !Content 

Instances

Instances details
IsString Content 
Instance details

Defined in Yesod.Core.Types

Methods

fromString :: String -> Content #

ToContent Content 
Instance details

Defined in Yesod.Core.Content

Methods

toContent :: Content -> Content #

ToContent (ContentType, Content) 
Instance details

Defined in Yesod.Core.Content

ToTypedContent (ContentType, Content) 
Instance details

Defined in Yesod.Core.Content

data TypedContent #

Instances

Instances details
ToContent TypedContent 
Instance details

Defined in Yesod.Core.Content

ToTypedContent TypedContent 
Instance details

Defined in Yesod.Core.Content

type RepHtml = Html #

newtype RepJson #

Constructors

RepJson Content 

Instances

Instances details
HasContentType RepJson 
Instance details

Defined in Yesod.Core.Content

ToContent RepJson 
Instance details

Defined in Yesod.Core.Content

Methods

toContent :: RepJson -> Content #

ToTypedContent RepJson 
Instance details

Defined in Yesod.Core.Content

newtype RepPlain #

Constructors

RepPlain Content 

Instances

Instances details
HasContentType RepPlain 
Instance details

Defined in Yesod.Core.Content

ToContent RepPlain 
Instance details

Defined in Yesod.Core.Content

ToTypedContent RepPlain 
Instance details

Defined in Yesod.Core.Content

newtype RepXml #

Constructors

RepXml Content 

Instances

Instances details
HasContentType RepXml 
Instance details

Defined in Yesod.Core.Content

ToContent RepXml 
Instance details

Defined in Yesod.Core.Content

Methods

toContent :: RepXml -> Content #

ToTypedContent RepXml 
Instance details

Defined in Yesod.Core.Content

newtype DontFullyEvaluate a #

Prevents a response body from being fully evaluated before sending the request.

Since 1.1.0

Constructors

DontFullyEvaluate 

Fields

Instances

Instances details
HasContentType a => HasContentType (DontFullyEvaluate a) 
Instance details

Defined in Yesod.Core.Content

ToContent a => ToContent (DontFullyEvaluate a) 
Instance details

Defined in Yesod.Core.Content

ToTypedContent a => ToTypedContent (DontFullyEvaluate a) 
Instance details

Defined in Yesod.Core.Content

data ErrorResponse #

Responses to indicate some form of an error occurred.

Constructors

NotFound

The requested resource was not found. Examples of when this occurs include when an incorrect URL is used, or yesod-persistent's get404 doesn't find a value. HTTP status: 404.

InternalError !Text

Some sort of unexpected exception. If your application uses throwIO or error to throw an exception, this is the form it would take. HTTP status: 500.

InvalidArgs ![Text]

Indicates some sort of invalid or missing argument, like a missing query parameter or malformed JSON body. Examples Yesod functions that send this include requireCheckJsonBody and Yesod.Auth.GoogleEmail2. HTTP status: 400.

NotAuthenticated

Indicates the user is not logged in. This is thrown when isAuthorized returns AuthenticationRequired. HTTP code: 401.

PermissionDenied !Text

Indicates the user doesn't have permission to access the requested resource. This is thrown when isAuthorized returns Unauthorized. HTTP code: 403.

BadMethod !Method

Indicates the URL would have been valid if used with a different HTTP method (e.g. a GET was used, but only POST is handled.) HTTP code: 405.

Instances

Instances details
Generic ErrorResponse 
Instance details

Defined in Yesod.Core.Types

Associated Types

type Rep ErrorResponse :: Type -> Type #

Show ErrorResponse 
Instance details

Defined in Yesod.Core.Types

NFData ErrorResponse 
Instance details

Defined in Yesod.Core.Types

Methods

rnf :: ErrorResponse -> () #

Eq ErrorResponse 
Instance details

Defined in Yesod.Core.Types

type Rep ErrorResponse 
Instance details

Defined in Yesod.Core.Types

type Rep ErrorResponse = D1 ('MetaData "ErrorResponse" "Yesod.Core.Types" "yesod-core-1.6.22.0-XMfmx4sV1IIAzgpsWs0Eg" 'False) ((C1 ('MetaCons "NotFound" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "InternalError" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text)) :+: C1 ('MetaCons "InvalidArgs" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 [Text])))) :+: (C1 ('MetaCons "NotAuthenticated" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "PermissionDenied" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text)) :+: C1 ('MetaCons "BadMethod" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Method)))))

data SubHandlerFor sub master a #

A handler monad for subsite

Since: yesod-core-1.6.0

Instances

Instances details
MonadIO (SubHandlerFor child master) 
Instance details

Defined in Yesod.Core.Types

Methods

liftIO :: IO a -> SubHandlerFor child master 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 #

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 #

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 #

MonadThrow (SubHandlerFor child master) 
Instance details

Defined in Yesod.Core.Types

Methods

throwM :: Exception e => e -> SubHandlerFor child master a #

MonadLogger (SubHandlerFor child master) 
Instance details

Defined in Yesod.Core.Types

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> SubHandlerFor child master () #

MonadLoggerIO (SubHandlerFor child master) 
Instance details

Defined in Yesod.Core.Types

Methods

askLoggerIO :: SubHandlerFor child master (Loc -> LogSource -> LogLevel -> LogStr -> IO ()) #

MonadResource (SubHandlerFor child master) 
Instance details

Defined in Yesod.Core.Types

Methods

liftResourceT :: ResourceT IO a -> SubHandlerFor child master a #

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 #

MonadHandler (SubHandlerFor sub master) 
Instance details

Defined in Yesod.Core.Class.Handler

Associated Types

type HandlerSite (SubHandlerFor sub master) #

type SubHandlerSite (SubHandlerFor sub master) #

Methods

liftHandler :: HandlerFor (HandlerSite (SubHandlerFor sub master)) a -> SubHandlerFor sub master a #

liftSubHandler :: SubHandlerFor (SubHandlerSite (SubHandlerFor sub master)) (HandlerSite (SubHandlerFor sub master)) a -> SubHandlerFor sub master 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 #

type HandlerSite (SubHandlerFor sub master) 
Instance details

Defined in Yesod.Core.Class.Handler

type HandlerSite (SubHandlerFor sub master) = master
type SubHandlerSite (SubHandlerFor sub master) 
Instance details

Defined in Yesod.Core.Class.Handler

type SubHandlerSite (SubHandlerFor sub master) = sub

data family Route a #

The type-safe URLs associated with a site argument.

Instances

Instances details
RedirectUrl master (Route master) 
Instance details

Defined in Yesod.Core.Handler

Methods

toTextUrl :: (MonadHandler m, HandlerSite m ~ master) => Route master -> m Text #

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

(key ~ Text, val ~ Text) => RedirectUrl master (Route master, [(key, val)]) 
Instance details

Defined in Yesod.Core.Handler

Methods

toTextUrl :: (MonadHandler m, HandlerSite m ~ master) => (Route master, [(key, val)]) -> m Text #

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

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

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

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

data Route App Source # 
Instance details

Defined in BtcLsp.Yesod.Foundation

data Route Auth 
Instance details

Defined in Yesod.Auth.Routes

data Route LiteApp 
Instance details

Defined in Yesod.Core.Internal.LiteApp

data Route WaiSubsite 
Instance details

Defined in Yesod.Core.Types

data Route WaiSubsiteWithAuth 
Instance details

Defined in Yesod.Core.Types

data Route Static 
Instance details

Defined in Yesod.Static

class Eq (Route a) => RenderRoute a where #

Associated Types

data Route a #

The type-safe URLs associated with a site argument.

Methods

renderRoute #

Arguments

:: Route a 
-> ([Text], [(Text, Text)])

The path of the URL split on forward slashes, and a list of query parameters with their associated value.

Instances

Instances details
RenderRoute App Source # 
Instance details

Defined in BtcLsp.Yesod.Foundation

Associated Types

data Route App #

Methods

renderRoute :: Route App -> ([Text], [(Text, Text)]) #

RenderRoute Auth 
Instance details

Defined in Yesod.Auth.Routes

Associated Types

data Route Auth #

Methods

renderRoute :: Route Auth -> ([Text], [(Text, Text)]) #

RenderRoute LiteApp 
Instance details

Defined in Yesod.Core.Internal.LiteApp

Associated Types

data Route LiteApp #

Methods

renderRoute :: Route LiteApp -> ([Text], [(Text, Text)]) #

RenderRoute WaiSubsite 
Instance details

Defined in Yesod.Core.Types

Associated Types

data Route WaiSubsite #

Methods

renderRoute :: Route WaiSubsite -> ([Text], [(Text, Text)]) #

RenderRoute WaiSubsiteWithAuth 
Instance details

Defined in Yesod.Core.Types

Associated Types

data Route WaiSubsiteWithAuth #

RenderRoute Static 
Instance details

Defined in Yesod.Static

Associated Types

data Route Static #

Methods

renderRoute :: Route Static -> ([Text], [(Text, Text)]) #

class RenderRoute a => ParseRoute a where #

Methods

parseRoute #

Arguments

:: ([Text], [(Text, Text)])

The path of the URL split on forward slashes, and a list of query parameters with their associated value.

-> Maybe (Route a) 

Instances

Instances details
ParseRoute App Source # 
Instance details

Defined in BtcLsp.Yesod.Foundation

Methods

parseRoute :: ([Text], [(Text, Text)]) -> Maybe (Route App) #

ParseRoute Auth 
Instance details

Defined in Yesod.Auth.Routes

Methods

parseRoute :: ([Text], [(Text, Text)]) -> Maybe (Route Auth) #

ParseRoute LiteApp 
Instance details

Defined in Yesod.Core.Internal.LiteApp

Methods

parseRoute :: ([Text], [(Text, Text)]) -> Maybe (Route LiteApp) #

ParseRoute WaiSubsite 
Instance details

Defined in Yesod.Core.Types

Methods

parseRoute :: ([Text], [(Text, Text)]) -> Maybe (Route WaiSubsite) #

ParseRoute WaiSubsiteWithAuth 
Instance details

Defined in Yesod.Core.Types

ParseRoute Static 
Instance details

Defined in Yesod.Static

Methods

parseRoute :: ([Text], [(Text, Text)]) -> Maybe (Route Static) #

class RenderRoute a => RouteAttrs a where #

Instances

Instances details
RouteAttrs App Source # 
Instance details

Defined in BtcLsp.Yesod.Foundation

Methods

routeAttrs :: Route App -> Set Text #

RouteAttrs Auth 
Instance details

Defined in Yesod.Auth.Routes

Methods

routeAttrs :: Route Auth -> Set Text #

formatRFC822 :: UTCTime -> Text #

Format as per RFC 822.

formatRFC1123 :: UTCTime -> Text #

Format as per RFC 1123.

formatW3 :: UTCTime -> Text #

Format a UTCTime in W3 format.

fileField :: forall (m :: Type -> Type). Monad m => Field m FileInfo #

Creates an input with type="file".

selectFieldHelper #

Arguments

:: (Eq a, RenderMessage site FormMessage) 
=> (Text -> Text -> [(Text, Text)] -> WidgetFor site () -> WidgetFor site ())

Outermost part of the field

-> (Text -> Text -> Bool -> WidgetFor site ())

An option for None if the field is optional

-> (Text -> Text -> [(Text, Text)] -> Text -> Bool -> Text -> WidgetFor site ())

Other options

-> HandlerFor site (OptionList a) 
-> Field (HandlerFor site) a 

A helper function for constucting selectFields. You may want to use this when you define your custom selectFields or radioFields.

Since: yesod-form-1.6.2

optionsPersistKey :: (YesodPersist site, PersistQueryRead backend, PathPiece (Key a), RenderMessage site msg, backend ~ YesodPersistBackend site, PersistRecordBackend a backend) => [Filter a] -> [SelectOpt a] -> (a -> msg) -> HandlerFor site (OptionList (Key a)) #

An alternative to optionsPersist which returns just the Key instead of the entire Entity.

Since 1.3.2

optionsPersist :: (YesodPersist site, PersistQueryRead backend, PathPiece (Key a), RenderMessage site msg, YesodPersistBackend site ~ backend, PersistRecordBackend a backend) => [Filter a] -> [SelectOpt a] -> (a -> msg) -> HandlerFor site (OptionList (Entity a)) #

Selects a list of Entitys with the given Filter and SelectOpts. The (a -> msg) function is then used to derive the display value for an OptionList. Example usage:

Country
   name Text
   deriving Eq -- Must derive Eq
data CountryForm = CountryForm
  { country :: Entity Country
  }

countryNameForm :: AForm Handler CountryForm
countryNameForm = CountryForm
        <$> areq (selectField countries) "Which country do you live in?" Nothing
        where
          countries = optionsPersist [] [Asc CountryName] countryName

optionsEnum :: (MonadHandler m, Show a, Enum a, Bounded a) => m (OptionList a) #

Creates an OptionList from an Enum, using its Show instance for the user-facing value.

optionsPairs :: (MonadHandler m, RenderMessage (HandlerSite m) msg) => [(msg, a)] -> m (OptionList a) #

Creates an OptionList from a list of (display-value, internal value) pairs.

mkOptionList :: [Option a] -> OptionList a #

Creates an OptionList, using a Map to implement the olReadExternal function.

checkBoxField :: forall (m :: Type -> Type). Monad m => Field m Bool #

Creates an input with type="checkbox". While the default boolField implements a radio button so you can differentiate between an empty response (Nothing) and a no response (Just False), this simpler checkbox field returns an empty response as Just False.

Note that this makes the field always optional.

boolField :: forall (m :: Type -> Type). (Monad m, RenderMessage (HandlerSite m) FormMessage) => Field m Bool #

Creates a group of radio buttons to answer the question given in the message. Radio buttons are used to allow differentiating between an empty response (Nothing) and a no response (Just False). Consider using the simpler checkBoxField if you don't need to make this distinction.

If this field is optional, the first radio button is labeled "<None>", the second "Yes" and the third "No".

If this field is required, the first radio button is labeled "Yes" and the second "No".

(Exact label titles will depend on localization).

radioField :: (Eq a, RenderMessage site FormMessage) => HandlerFor site (OptionList a) -> Field (HandlerFor site) a #

Creates an input with type="radio" for selecting one option.

checkboxesField :: Eq a => HandlerFor site (OptionList a) -> Field (HandlerFor site) [a] #

Creates an input with type="checkbox" for selecting multiple options.

checkboxesFieldList :: (Eq a, RenderMessage site msg) => [(msg, a)] -> Field (HandlerFor site) [a] #

Creates an input with type="checkbox" for selecting multiple options.

radioFieldList :: (Eq a, RenderMessage site FormMessage, RenderMessage site msg) => [(msg, a)] -> Field (HandlerFor site) a #

Creates an input with type="radio" for selecting one option.

multiSelectField :: Eq a => HandlerFor site (OptionList a) -> Field (HandlerFor site) [a] #

Creates a <select> tag for selecting multiple options.

multiSelectFieldList :: (Eq a, RenderMessage site msg) => [(msg, a)] -> Field (HandlerFor site) [a] #

Creates a <select> tag for selecting multiple options.

selectField :: (Eq a, RenderMessage site FormMessage) => HandlerFor site (OptionList a) -> Field (HandlerFor site) a #

Creates a <select> tag for selecting one option. Example usage:

areq (selectField $ optionsPairs [(MsgValue1, "value1"),(MsgValue2, "value2")]) "Which value?" Nothing

selectFieldList :: (Eq a, RenderMessage site FormMessage, RenderMessage site msg) => [(msg, a)] -> Field (HandlerFor site) a #

Creates a <select> tag for selecting one option. Example usage:

areq (selectFieldList [("Value 1" :: Text, "value1"),("Value 2", "value2")]) "Which value?" Nothing

urlField :: forall (m :: Type -> Type). (Monad m, RenderMessage (HandlerSite m) FormMessage) => Field m Text #

Creates an input with type="url", validating the URL according to RFC3986.

searchField :: forall (m :: Type -> Type). (Monad m, RenderMessage (HandlerSite m) FormMessage) => AutoFocus -> Field m Text #

Creates an input with type="search". For browsers without autofocus support, a JS fallback is used if AutoFocus is true.

multiEmailField :: forall (m :: Type -> Type). (Monad m, RenderMessage (HandlerSite m) FormMessage) => Field m [Text] #

Creates an input with type="email" with the multiple attribute; browsers might implement this as taking a comma separated list of emails. Each email address is validated as described in emailField.

Since 1.3.7

emailField :: forall (m :: Type -> Type). (Monad m, RenderMessage (HandlerSite m) FormMessage) => Field m Text #

Creates an input with type="email". Yesod will validate the email's correctness according to RFC5322 and canonicalize it by removing comments and whitespace (see Text.Email.Validate).

passwordField :: forall (m :: Type -> Type). (Monad m, RenderMessage (HandlerSite m) FormMessage) => Field m Text #

Creates an input with type="password".

textField :: forall (m :: Type -> Type). (Monad m, RenderMessage (HandlerSite m) FormMessage) => Field m Text #

Creates a input with type="text".

hiddenField :: forall (m :: Type -> Type) p. (Monad m, PathPiece p, RenderMessage (HandlerSite m) FormMessage) => Field m p #

Creates an input with type="hidden"; you can use this to store information in a form that users shouldn't see (for example, Yesod stores CSRF tokens in a hidden field).

textareaField :: forall (m :: Type -> Type). (Monad m, RenderMessage (HandlerSite m) FormMessage) => Field m Textarea #

Creates a <textarea> tag whose returned value is wrapped in a Textarea; see Textarea for details.

htmlField :: forall (m :: Type -> Type). (Monad m, RenderMessage (HandlerSite m) FormMessage) => Field m Html #

Creates a <textarea> tag whose input is sanitized to prevent XSS attacks and is validated for having balanced tags.

timeFieldTypeText :: forall (m :: Type -> Type). (Monad m, RenderMessage (HandlerSite m) FormMessage) => Field m TimeOfDay #

Creates an input with type="text", parsing the time from an [H]H:MM[:SS] format, with an optional AM or PM (if not given, AM is assumed for compatibility with the 24 hour clock system).

This function exists for backwards compatibility with the old implementation of timeField, which used to use type="text". Consider using timeField or timeFieldTypeTime for improved UX and validation from the browser.

Add the time package and import the Data.Time.LocalTime module to use this function.

Since 1.4.2

timeFieldTypeTime :: forall (m :: Type -> Type). (Monad m, RenderMessage (HandlerSite m) FormMessage) => Field m TimeOfDay #

Creates an input with type="time". Browsers not supporting this type will fallback to a text field, and Yesod will parse the time as described in timeFieldTypeText.

Add the time package and import the Data.Time.LocalTime module to use this function.

Since 1.4.2

dayField :: forall (m :: Type -> Type). (Monad m, RenderMessage (HandlerSite m) FormMessage) => Field m Day #

Creates an input with type="date", validating the input using the parseDate function.

Add the time package and import the Data.Time.Calendar module to use this function.

doubleField :: forall (m :: Type -> Type). (Monad m, RenderMessage (HandlerSite m) FormMessage) => Field m Double #

Creates a input with type="number" and step=any.

intField :: forall (m :: Type -> Type) i. (Monad m, Integral i, RenderMessage (HandlerSite m) FormMessage) => Field m i #

Creates a input with type="number" and step=1.

newtype Textarea #

A newtype wrapper around a Text whose ToMarkup instance converts newlines to HTML <br> tags.

(When text is entered into a <textarea>, newline characters are used to separate lines. If this text is then placed verbatim into HTML, the lines won't be separated, thus the need for replacing with <br> tags). If you don't need this functionality, simply use unTextarea to access the raw text.

Constructors

Textarea 

Fields

Instances

Instances details
FromJSON Textarea 
Instance details

Defined in Yesod.Form.Fields

ToJSON Textarea 
Instance details

Defined in Yesod.Form.Fields

IsString Textarea 
Instance details

Defined in Yesod.Form.Fields

Read Textarea 
Instance details

Defined in Yesod.Form.Fields

Show Textarea 
Instance details

Defined in Yesod.Form.Fields

ToMarkup Textarea 
Instance details

Defined in Yesod.Form.Fields

Eq Textarea 
Instance details

Defined in Yesod.Form.Fields

Ord Textarea 
Instance details

Defined in Yesod.Form.Fields

PersistField Textarea 
Instance details

Defined in Yesod.Form.Fields

PersistFieldSql Textarea 
Instance details

Defined in Yesod.Form.Fields

data OptionList a #

A structure holding a list of options. Typically you can use a convenience function like mkOptionList or optionsPairs instead of creating this directly.

Constructors

OptionList 

Fields

Instances

Instances details
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 #

data Option a #

Constructors

Option 

Fields

Instances

Instances details
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 #

addClass #

Arguments

:: Text

The class to add

-> [(Text, Text)]

List of existing fsAttrs

-> [(Text, Text)] 

Adds a CSS class to the fsAttrs in a FieldSettings.

Examples

Expand
>>> addClass "login-form" [("class", "form-control"), ("id", "home-login")]
[("class","form-control login-form"),("id","home-login")]

Since: yesod-form-1.6.2

removeClass #

Arguments

:: Text

The class to remove

-> [(Text, Text)]

List of existing fsAttrs

-> [(Text, Text)] 

Removes a CSS class from the fsAttrs in a FieldSettings.

Examples

Expand
>>> removeClass "form-control" [("class","form-control login-form"),("id","home-login")]
[("class","  login-form"),("id","home-login")]

Since: yesod-form-1.6.2

convertField :: forall (m :: Type -> Type) a b. Functor m => (a -> b) -> (b -> a) -> Field m a -> Field m b #

Since a Field cannot be a Functor, it is not obvious how to "reuse" a Field on a newtype or otherwise equivalent type. This function allows you to convert a Field m a to a Field m b assuming you provide a bidirectional conversion between the two, through the first two functions.

A simple example:

import Data.Monoid
sumField :: (Functor m, Monad m, RenderMessage (HandlerSite m) FormMessage) => Field m (Sum Int)
sumField = convertField Sum getSum intField

Another example, not using a newtype, but instead creating a Lazy Text field:

import qualified Data.Text.Lazy as TL
TextField :: (Functor m, Monad m, RenderMessage (HandlerSite m) FormMessage) => Field m TL.Text
lazyTextField = convertField TL.fromStrict TL.toStrict textField

Since 1.3.16

parseHelperGen :: (Monad m, RenderMessage site msg) => (Text -> Either msg a) -> [Text] -> [FileInfo] -> m (Either (SomeMessage site) (Maybe a)) #

A generalized version of parseHelper, allowing any type for the message indicating a bad parse.

Since 1.3.6

parseHelper :: (Monad m, RenderMessage site FormMessage) => (Text -> Either FormMessage a) -> [Text] -> [FileInfo] -> m (Either (SomeMessage site) (Maybe a)) #

A helper function for creating custom fields.

This is intended to help with the common case where a single input value is required, such as when parsing a text field.

Since 1.1

fieldSettingsLabel :: RenderMessage site msg => msg -> FieldSettings site #

Generate a FieldSettings from the given label.

customErrorMessage :: forall (m :: Type -> Type) a. Monad m => SomeMessage (HandlerSite m) -> Field m a -> Field m a #

Allows you to overwrite the error message on parse error.

checkMMap :: (Monad m, RenderMessage (HandlerSite m) msg) => (a -> m (Either msg b)) -> (b -> a) -> Field m a -> Field m b #

Same as checkM, but modifies the datatype.

In order to make this work, you must provide a function to convert back from the new datatype to the old one (the second argument to this function).

Since 1.1.2

checkM :: (Monad m, RenderMessage (HandlerSite m) msg) => (a -> m (Either msg a)) -> Field m a -> Field m a #

checkBool :: forall (m :: Type -> Type) msg a. (Monad m, RenderMessage (HandlerSite m) msg) => (a -> Bool) -> msg -> Field m a -> Field m a #

Return the given error message if the predicate is false.

check :: forall (m :: Type -> Type) msg a. (Monad m, RenderMessage (HandlerSite m) msg) => (a -> Either msg a) -> Field m a -> Field m a #

renderBootstrap :: forall (m :: Type -> Type) a. Monad m => FormRender m a #

Deprecated synonym for renderBootstrap2.

renderBootstrap2 :: forall (m :: Type -> Type) a. Monad m => FormRender m a #

Render a form using Bootstrap v2-friendly shamlet syntax. If you're using Bootstrap v3, then you should use the functions from module Yesod.Form.Bootstrap3.

Sample Hamlet:

 <form .form-horizontal method=post action=@{ActionR} enctype=#{formEnctype}>
   <fieldset>
     <legend>_{MsgLegend}
     $case result
       $of FormFailure reasons
         $forall reason <- reasons
           <div .alert .alert-error>#{reason}
       $of _
     ^{formWidget}
     <div .form-actions>
       <input .btn .primary type=submit value=_{MsgSubmit}>

Since 1.3.14

renderDivsNoLabels :: forall (m :: Type -> Type) a. Monad m => FormRender m a #

render a field inside a div, not displaying any label

renderDivs :: forall (m :: Type -> Type) a. Monad m => FormRender m a #

render a field inside a div

renderTable :: forall (m :: Type -> Type) a. Monad m => FormRender m a #

Render a form into a series of tr tags. Note that, in order to allow you to add extra rows to the table, this function does not wrap up the resulting HTML in a table tag; you must do that yourself.

identifyForm #

Arguments

:: forall (m :: Type -> Type) a. Monad m 
=> Text

Form identification string.

-> (Markup -> MForm m (FormResult a, WidgetFor (HandlerSite m) ())) 
-> Markup 
-> MForm m (FormResult a, WidgetFor (HandlerSite m) ()) 

Creates a hidden field on the form that identifies it. This identification is then used to distinguish between missing and wrong form data when a single handler contains more than one form.

For instance, if you have the following code on your handler:

((fooRes, fooWidget), fooEnctype) <- runFormPost fooForm
((barRes, barWidget), barEnctype) <- runFormPost barForm

Then replace it with

((fooRes, fooWidget), fooEnctype) <- runFormPost $ identifyForm "foo" fooForm
((barRes, barWidget), barEnctype) <- runFormPost $ identifyForm "bar" barForm

Note that it's your responsibility to ensure that the identification strings are unique (using the same one twice on a single handler will not generate any errors). This allows you to create a variable number of forms and still have them work even if their number or order change between the HTML generation and the form submission.

generateFormGet :: MonadHandler m => (Markup -> MForm m a) -> m (a, Enctype) #

generateFormGet' :: MonadHandler m => (Markup -> MForm m (FormResult a, xml)) -> m (xml, Enctype) #

Since 1.3.11

runFormGet :: MonadHandler m => (Markup -> MForm m a) -> m (a, Enctype) #

generateFormPost :: (RenderMessage (HandlerSite m) FormMessage, MonadHandler m) => (Markup -> MForm m (FormResult a, xml)) -> m (xml, Enctype) #

Similar to runFormPost, except it always ignores the currently available environment. This is necessary in cases like a wizard UI, where a single page will both receive and incoming form and produce a new, blank form. For general usage, you can stick with runFormPost.

runFormPost :: (RenderMessage (HandlerSite m) FormMessage, MonadResource m, MonadHandler m) => (Markup -> MForm m (FormResult a, xml)) -> m ((FormResult a, xml), Enctype) #

This function is used to both initially render a form and to later extract results from it. Note that, due to CSRF protection and a few other issues, forms submitted via GET and POST are slightly different. As such, be sure to call the relevant function based on how the form will be submitted, not the current request method.

For example, a common case is displaying a form on a GET request and having the form submit to a POST page. In such a case, both the GET and POST handlers should use runFormPost.

aopt :: forall (m :: Type -> Type) a. MonadHandler m => Field m a -> FieldSettings (HandlerSite m) -> Maybe (Maybe a) -> AForm m (Maybe a) #

Applicative equivalent of mopt.

areqMsg #

Arguments

:: forall site msg (m :: Type -> Type) a. (RenderMessage site msg, HandlerSite m ~ site, MonadHandler m) 
=> Field m a

form field

-> FieldSettings site

settings for this field

-> msg

message to use in case value is Nothing

-> Maybe a

optional default value

-> AForm m a 

Same as areq but with your own message to be rendered in case the value is not provided.

This is useful when you have several required fields on the page and you want to differentiate between which fields were left blank. Otherwise the user sees "Value is required" multiple times, which is ambiguous.

Since: yesod-form-1.6.7

areq #

Arguments

:: forall site (m :: Type -> Type) a. (RenderMessage site FormMessage, HandlerSite m ~ site, MonadHandler m) 
=> Field m a

form field

-> FieldSettings site

settings for this field

-> Maybe a

optional default value

-> AForm m a 

Applicative equivalent of mreq.

mopt :: forall site (m :: Type -> Type) a. (site ~ HandlerSite m, MonadHandler m) => Field m a -> FieldSettings site -> Maybe (Maybe a) -> MForm m (FormResult (Maybe a), FieldView site) #

Converts a form field into monadic form. This field is optional, i.e. if filled in, it returns 'Just a', if left empty, it returns Nothing. Arguments are the same as for mreq (apart from type of default value).

mreqMsg #

Arguments

:: forall site msg (m :: Type -> Type) a. (RenderMessage site msg, HandlerSite m ~ site, MonadHandler m) 
=> Field m a

form field

-> FieldSettings site

settings for this field

-> msg

Message to use in case value is Nothing

-> Maybe a

optional default value

-> MForm m (FormResult a, FieldView site) 

Same as mreq but with your own message to be rendered in case the value is not provided.

This is useful when you have several required fields on the page and you want to differentiate between which fields were left blank. Otherwise the user sees "Value is required" multiple times, which is ambiguous.

Since: yesod-form-1.6.6

mreq #

Arguments

:: forall site (m :: Type -> Type) a. (RenderMessage site FormMessage, HandlerSite m ~ site, MonadHandler m) 
=> Field m a

form field

-> FieldSettings site

settings for this field

-> Maybe a

optional default value

-> MForm m (FormResult a, FieldView site) 

Converts a form field into monadic form. This field requires a value and will return FormFailure if left empty.

mFormToWForm #

Arguments

:: forall (m :: Type -> Type) site a. (MonadHandler m, HandlerSite m ~ site) 
=> MForm m (a, FieldView site)

input form

-> WForm m a

output form

Converts a monadic form MForm into another monadic form WForm.

Since: yesod-form-1.4.14

wFormToMForm #

Arguments

:: forall (m :: Type -> Type) site a. (MonadHandler m, HandlerSite m ~ site) 
=> WForm m a

input form

-> MForm m (a, [FieldView site])

output form

Converts a monadic form WForm into another monadic form MForm.

Since: yesod-form-1.4.14

wFormToAForm #

Arguments

:: forall (m :: Type -> Type) a. MonadHandler m 
=> WForm m (FormResult a)

input form

-> AForm m a

output form

Converts a monadic form WForm into an applicative form AForm.

Since: yesod-form-1.4.14

wopt #

Arguments

:: forall (m :: Type -> Type) site a. (MonadHandler m, HandlerSite m ~ site) 
=> Field m a

form field

-> FieldSettings site

settings for this field

-> Maybe (Maybe a)

optional default value

-> WForm m (FormResult (Maybe a)) 

Converts a form field into monadic form WForm. This field is optional, i.e. if filled in, it returns 'Just a', if left empty, it returns Nothing. Arguments are the same as for wreq (apart from type of default value).

Since: yesod-form-1.4.14

wreqMsg #

Arguments

:: forall site msg (m :: Type -> Type) a. (RenderMessage site msg, HandlerSite m ~ site, MonadHandler m) 
=> Field m a

form field

-> FieldSettings site

settings for this field

-> msg

message to use in case value is Nothing

-> Maybe a

optional default value

-> WForm m (FormResult a) 

Same as wreq but with your own message to be rendered in case the value is not provided.

This is useful when you have several required fields on the page and you want to differentiate between which fields were left blank. Otherwise the user sees "Value is required" multiple times, which is ambiguous.

Since: yesod-form-1.6.7

wreq #

Arguments

:: forall site (m :: Type -> Type) a. (RenderMessage site FormMessage, HandlerSite m ~ site, MonadHandler m) 
=> Field m a

form field

-> FieldSettings site

settings for this field

-> Maybe a

optional default value

-> WForm m (FormResult a) 

Converts a form field into monadic form WForm. This field requires a value and will return FormFailure if left empty.

Since: yesod-form-1.4.14

askFiles :: forall (m :: Type -> Type). Monad m => MForm m (Maybe FileEnv) #

askParams :: forall (m :: Type -> Type). Monad m => MForm m (Maybe Env) #

aFormToForm :: forall (m :: Type -> Type) site a. (Monad m, HandlerSite m ~ site) => AForm m a -> MForm m (FormResult a, [FieldView site] -> [FieldView site]) #

formToAForm :: forall (m :: Type -> Type) site a. (HandlerSite m ~ site, Monad m) => MForm m (FormResult a, [FieldView site]) -> AForm m a #

newFormIdent :: forall (m :: Type -> Type). Monad m => MForm m Text #

Get a unique identifier.

type FormRender (m :: Type -> Type) a = AForm m a -> Markup -> MForm m (FormResult a, WidgetFor (HandlerSite m) ()) #

runInputPostResult :: MonadHandler m => FormInput m a -> m (FormResult a) #

Run a FormInput on the POST parameters (i.e., request body). Does not throw exceptions on failure.

runInputPost :: MonadHandler m => FormInput m a -> m a #

Run a FormInput on the POST parameters (i.e., request body). If parsing fails, calls invalidArgs.

runInputGetResult :: MonadHandler m => FormInput m a -> m (FormResult a) #

Run a FormInput on the GET parameters (i.e., query string). Does not throw exceptions on failure.

Since 1.4.1

runInputGet :: MonadHandler m => FormInput m a -> m a #

Run a FormInput on the GET parameters (i.e., query string). If parsing fails, calls invalidArgs.

iopt :: forall (m :: Type -> Type) a. Monad m => Field m a -> Text -> FormInput m (Maybe a) #

Promote a Field into a FormInput, with its presence being optional. If the value is present but does not parse correctly, the form will still fail.

ireq #

Arguments

:: forall (m :: Type -> Type) a. (Monad m, RenderMessage (HandlerSite m) FormMessage) 
=> Field m a 
-> Text

name of the field

-> FormInput m a 

Promote a Field into a FormInput, requiring that the value be present and valid.

newtype FormInput (m :: Type -> Type) a #

Type for a form which parses a value of type a with the base monad m (usually your Handler). Can compose this using its Applicative instance.

Constructors

FormInput 

Fields

Instances

Instances details
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 => 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 #

data FormResult a #

A form can produce three different results: there was no data available, the data was invalid, or there was a successful parse.

The Applicative instance will concatenate the failure messages in two FormResults. The Alternative instance will choose FormFailure before FormSuccess, and FormMissing last of all.

Instances

Instances details
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 #

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

Alternative FormResult

Since: yesod-form-1.4.15

Instance details

Defined in Yesod.Form.Types

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 #

Functor FormResult 
Instance details

Defined in Yesod.Form.Types

Methods

fmap :: (a -> b) -> FormResult a -> FormResult b #

(<$) :: a -> FormResult b -> FormResult a #

Monoid m => Monoid (FormResult m) 
Instance details

Defined in Yesod.Form.Types

Semigroup m => Semigroup (FormResult m) 
Instance details

Defined in Yesod.Form.Types

Show a => Show (FormResult a) 
Instance details

Defined in Yesod.Form.Types

Eq a => Eq (FormResult a) 
Instance details

Defined in Yesod.Form.Types

Methods

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

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

data Enctype #

The encoding type required by a form. The ToHtml instance produces values that can be inserted directly into HTML.

Constructors

UrlEncoded 
Multipart 

Instances

Instances details
Monoid Enctype 
Instance details

Defined in Yesod.Form.Types

Semigroup Enctype 
Instance details

Defined in Yesod.Form.Types

Bounded Enctype 
Instance details

Defined in Yesod.Form.Types

Enum Enctype 
Instance details

Defined in Yesod.Form.Types

ToMarkup Enctype 
Instance details

Defined in Yesod.Form.Types

ToValue Enctype 
Instance details

Defined in Yesod.Form.Types

Eq Enctype 
Instance details

Defined in Yesod.Form.Types

Methods

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

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

data Ints #

Constructors

IntCons Int Ints 
IntSingle Int 

Instances

Instances details
Show Ints 
Instance details

Defined in Yesod.Form.Types

Methods

showsPrec :: Int -> Ints -> ShowS #

show :: Ints -> String #

showList :: [Ints] -> ShowS #

type Env = Map Text [Text] #

type WForm (m :: Type -> Type) a = MForm (WriterT [FieldView (HandlerSite m)] m) a #

MForm variant stacking a WriterT. The following code example using a monadic form MForm:

formToAForm $ do
  (field1F, field1V) <- mreq textField MsgField1 Nothing
  (field2F, field2V) <- mreq (checkWith field1F textField) MsgField2 Nothing
  (field3F, field3V) <- mreq (checkWith field1F textField) MsgField3 Nothing
  return
    ( MyForm <$> field1F <*> field2F <*> field3F
    , [field1V, field2V, field3V]
    )

Could be rewritten as follows using WForm:

wFormToAForm $ do
  field1F <- wreq textField MsgField1 Nothing
  field2F <- wreq (checkWith field1F textField) MsgField2 Nothing
  field3F <- wreq (checkWith field1F textField) MsgField3 Nothing
  return $ MyForm <$> field1F <*> field2F <*> field3F

Since: yesod-form-1.4.14

type MForm (m :: Type -> Type) a = RWST (Maybe (Env, FileEnv), HandlerSite m, [Lang]) Enctype Ints m a #

newtype AForm (m :: Type -> Type) a #

Constructors

AForm 

Instances

Instances details
MonadTrans AForm 
Instance details

Defined in Yesod.Form.Types

Methods

lift :: Monad m => m a -> AForm 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 #

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 #

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

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

data FieldSettings master #

Constructors

FieldSettings 

Fields

Instances

Instances details
IsString (FieldSettings a) 
Instance details

Defined in Yesod.Form.Types

data FieldView site #

Constructors

FieldView 

type FieldViewFunc (m :: Type -> Type) a #

Arguments

 = Text

ID

-> Text

Name

-> [(Text, Text)]

Attributes

-> Either Text a

Either (invalid text) or (legitimate result)

-> Bool

Required?

-> WidgetFor (HandlerSite m) () 

data Field (m :: Type -> Type) a #

Constructors

Field 

insert400_ :: forall (m :: Type -> Type) backend val. (MonadIO m, PersistUniqueWrite backend, PersistRecordBackend val backend) => val -> ReaderT backend m () #

Same as insert400, but doesn’t return a key.

Since: yesod-persistent-1.4.1

insert400 :: forall (m :: Type -> Type) backend val. (MonadIO m, PersistUniqueWrite backend, PersistRecordBackend val backend) => val -> ReaderT backend m (Key val) #

Create a new record in the database, returning an automatically created key, or raise a 400 bad request if a uniqueness constraint is violated.

Since: yesod-persistent-1.4.1

getBy404 :: forall backend val (m :: Type -> Type). (PersistUniqueRead backend, PersistRecordBackend val backend, MonadIO m) => Unique val -> ReaderT backend m (Entity val) #

Get the given entity by unique key, or return a 404 not found if it doesn't exist.

get404 :: forall (m :: Type -> Type) backend val. (MonadIO m, PersistStoreRead backend, PersistRecordBackend val backend) => Key val -> ReaderT backend m val #

Get the given entity by ID, or return a 404 not found if it doesn't exist.

respondSourceDB :: YesodPersistRunner site => ContentType -> ConduitT () (Flush Builder) (YesodDB site) () -> HandlerFor site TypedContent #

Extends respondSource to create a streaming database response body.

runDBSource :: YesodPersistRunner site => ConduitT () a (YesodDB site) () -> ConduitT () a (HandlerFor site) () #

Like runDB, but transforms a Source. See respondSourceDB for an example, practical use case.

Since 1.2.0

defaultGetDBRunner :: (IsSqlBackend backend, YesodPersistBackend site ~ backend) => (site -> Pool backend) -> HandlerFor site (DBRunner site, HandlerFor site ()) #

Helper for implementing getDBRunner.

Since 1.2.0

defaultRunDB :: PersistConfig c => (site -> c) -> (site -> PersistConfigPool c) -> PersistConfigBackend c (HandlerFor site) a -> HandlerFor site a #

Helper for creating runDB.

Since 1.2.0

type YesodDB site = ReaderT (YesodPersistBackend site) (HandlerFor site) #

type family YesodPersistBackend site #

Instances

Instances details
type YesodPersistBackend App Source # 
Instance details

Defined in BtcLsp.Yesod.Foundation

class Monad (YesodDB site) => YesodPersist site where #

Associated Types

type YesodPersistBackend site #

Methods

runDB :: YesodDB site a -> HandlerFor site a #

Allows you to execute database actions within Yesod Handlers. For databases that support it, code inside the action will run as an atomic transaction.

Example Usage

Expand
userId <- runDB $ do
  userId <- insert $ User "username" "email@example.com"
  insert_ $ UserPreferences userId True
  pure userId

Instances

Instances details
YesodPersist App Source # 
Instance details

Defined in BtcLsp.Yesod.Foundation

Associated Types

type YesodPersistBackend App #

Methods

runDB :: YesodDB App a -> HandlerFor App a #

class YesodPersist site => YesodPersistRunner site where #

Since 1.2.0

Methods

getDBRunner :: HandlerFor site (DBRunner site, HandlerFor site ()) #

This function differs from runDB in that it returns a database runner function, as opposed to simply running a single action. This will usually mean that a connection is taken from a pool and then reused for each invocation. This can be useful for creating streaming responses; see runDBSource.

It additionally returns a cleanup function to free the connection. If your code finishes successfully, you must call this cleanup to indicate changes should be committed. Otherwise, for SQL backends at least, a rollback will be used instead.

Since 1.2.0

Instances

Instances details
YesodPersistRunner App Source # 
Instance details

Defined in BtcLsp.Yesod.Foundation

newtype DBRunner site #

Constructors

DBRunner 

Fields

type Application = Request -> (Response -> IO ResponseReceived) -> IO ResponseReceived #

The WAI application.

Note that, since WAI 3.0, this type is structured in continuation passing style to allow for proper safe resource handling. This was handled in the past via other means (e.g., ResourceT). As a demonstration:

app :: Application
app req respond = bracket_
    (putStrLn "Allocating scarce resource")
    (putStrLn "Cleaning up")
    (respond $ responseLBS status200 [] "Hello World")

type JavascriptUrl url = (url -> [(Text, Text)] -> Text) -> Javascript #

Return type of template-reading functions.

renderJavascriptUrl :: (url -> [(Text, Text)] -> Text) -> JavascriptUrl url -> Text #

render with route interpolation. If using this module standalone, apart from type-safe routes, a dummy renderer can be used:

renderJavascriptUrl (\_ _ -> undefined) javascriptUrl

When using Yesod, a renderer is generated for you, which can be accessed within the GHandler monad: getUrlRenderParams.

type CssUrl url = (url -> [(Text, Text)] -> Text) -> Css #

renderCssUrl :: (url -> [(Text, Text)] -> Text) -> CssUrl url -> Text #

lucius :: QuasiQuoter #

>>> renderCss ([lucius|foo{bar:baz}|] undefined)
"foo{bar:baz}"

type HtmlUrl url = Render url -> Html #

A function generating an Html given a URL-rendering function.

shamlet :: QuasiQuoter #

"Simple Hamlet" quasi-quoter. May only be used to generate expressions.

Generated expressions have type Html.

>>> putStrLn (renderHtml [shamlet|<div>Hello, world!|])
<div>Hello, world!</div>

hamlet :: QuasiQuoter #

Hamlet quasi-quoter. May only be used to generate expressions.

Generated expression have type HtmlUrl url, for some url.

data MyRoute = Home

render :: Render MyRoute
render Home _ = "/home"

>>> putStrLn (renderHtml ([hamlet|<a href=@{Home}>Home|] render))
<a href="/home">Home</a>

xhamlet :: QuasiQuoter #

Like hamlet, but produces XHTML.

data SomeMessage master #

Constructors

RenderMessage master msg => SomeMessage msg 

Instances

Instances details
master ~ master' => RenderMessage master (SomeMessage master') 
Instance details

Defined in Text.Shakespeare.I18N

Methods

renderMessage :: master -> [Lang] -> SomeMessage master' -> Text #

IsString (SomeMessage master) 
Instance details

Defined in Text.Shakespeare.I18N

Methods

fromString :: String -> SomeMessage master #

type Lang = Text #

an RFC1766 / ISO 639-1 language code (eg, fr, en-GB, etc).

class RenderMessage master message where #

the RenderMessage is used to provide translations for a message types

The master argument exists so that it is possible to provide more than one set of translations for a message type. This is useful if a library provides a default set of translations, but the user of the library wants to provide a different set of translations.

Methods

renderMessage #

Arguments

:: master

type that specifies which set of translations to use

-> [Lang]

acceptable languages in descending order of preference

-> message

message to translate

-> Text 

Instances

Instances details
RenderMessage App AppMessage Source # 
Instance details

Defined in BtcLsp.Yesod.Foundation

Methods

renderMessage :: App -> [Lang] -> AppMessage -> Text #

RenderMessage App FormMessage Source # 
Instance details

Defined in BtcLsp.Yesod.Foundation

Methods

renderMessage :: App -> [Lang] -> FormMessage -> Text #

RenderMessage master Text 
Instance details

Defined in Text.Shakespeare.I18N

Methods

renderMessage :: master -> [Lang] -> Text -> Text #

master ~ master' => RenderMessage master (SomeMessage master') 
Instance details

Defined in Text.Shakespeare.I18N

Methods

renderMessage :: master -> [Lang] -> SomeMessage master' -> Text #

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 #

mkMessage #

Arguments

:: String

base name to use for translation type

-> FilePath

subdirectory which contains the translation files

-> Lang

default translation language

-> Q [Dec] 

generate translations from translation files

This function will:

  1. look in the supplied subdirectory for files ending in .msg
  2. generate a type based on the constructors found
  3. create a RenderMessage instance

mkMessageFor #

Arguments

:: String

master translation data type

-> String

existing type to add translations for

-> FilePath

path to translation folder

-> Lang

default language

-> Q [Dec] 

create RenderMessage instance for an existing data-type

mkMessageVariant #

Arguments

:: String

master translation data type

-> String

existing type to add translations for

-> FilePath

path to translation folder

-> Lang

default language

-> Q [Dec] 

create an additional set of translations for a type created by mkMessage

class PersistConfig c where #

Represents a value containing all the configuration options for a specific backend. This abstraction makes it easier to write code that can easily swap backends.

Minimal complete definition

loadConfig, createPoolConfig, runPool

Associated Types

type PersistConfigBackend c :: (Type -> Type) -> Type -> Type #

type PersistConfigPool c #

Methods

loadConfig :: Value -> Parser c #

Load the config settings from a Value, most likely taken from a YAML config file.

applyEnv :: c -> IO c #

Modify the config settings based on environment variables.

createPoolConfig :: c -> IO (PersistConfigPool c) #

Create a new connection pool based on the given config settings.

runPool :: MonadUnliftIO m => c -> PersistConfigBackend c m a -> PersistConfigPool c -> m a #

Run a database action by taking a connection from the pool.

type family PersistConfigBackend c :: (Type -> Type) -> Type -> Type #

type family PersistConfigPool c #

Instances

Instances details
type PersistConfigPool PostgresConf 
Instance details

Defined in Database.Persist.Postgresql

type PersistConfigPool (Either c1 c2) 
Instance details

Defined in Database.Persist.Class.PersistConfig

newtype ConstraintNameHS #

An ConstraintNameHS represents the Haskell-side name that persistent will use for a constraint.

Since: persistent-2.12.0.0

Constructors

ConstraintNameHS 

newtype ConstraintNameDB #

A ConstraintNameDB represents the datastore-side name that persistent will use for a constraint.

Since: persistent-2.12.0.0

Constructors

ConstraintNameDB 

Instances

Instances details
Read ConstraintNameDB 
Instance details

Defined in Database.Persist.Names

Show ConstraintNameDB 
Instance details

Defined in Database.Persist.Names

Eq ConstraintNameDB 
Instance details

Defined in Database.Persist.Names

Ord ConstraintNameDB 
Instance details

Defined in Database.Persist.Names

DatabaseName ConstraintNameDB

Since: persistent-2.12.0.0

Instance details

Defined in Database.Persist.Names

Methods

escapeWith :: (Text -> str) -> ConstraintNameDB -> str #

Lift ConstraintNameDB 
Instance details

Defined in Database.Persist.Names

Methods

lift :: Quote m => ConstraintNameDB -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => ConstraintNameDB -> Code m ConstraintNameDB #

newtype EntityNameDB #

An EntityNameDB represents the datastore-side name that persistent will use for an entity.

Since: persistent-2.12.0.0

Constructors

EntityNameDB 

Fields

newtype EntityNameHS #

An EntityNameHS represents the Haskell-side name that persistent will use for an entity.

Since: persistent-2.12.0.0

Constructors

EntityNameHS 

Fields

newtype FieldNameHS #

A FieldNameHS represents the Haskell-side name that persistent will use for a field.

Since: persistent-2.12.0.0

Constructors

FieldNameHS 

Fields

newtype FieldNameDB #

An EntityNameDB represents the datastore-side name that persistent will use for an entity.

Since: persistent-2.12.0.0

Constructors

FieldNameDB 

Fields

Instances

Instances details
Read FieldNameDB 
Instance details

Defined in Database.Persist.Names

Show FieldNameDB 
Instance details

Defined in Database.Persist.Names

Eq FieldNameDB 
Instance details

Defined in Database.Persist.Names

Ord FieldNameDB 
Instance details

Defined in Database.Persist.Names

DatabaseName FieldNameDB

Since: persistent-2.12.0.0

Instance details

Defined in Database.Persist.Names

Methods

escapeWith :: (Text -> str) -> FieldNameDB -> str #

Lift FieldNameDB 
Instance details

Defined in Database.Persist.Names

Methods

lift :: Quote m => FieldNameDB -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => FieldNameDB -> Code m FieldNameDB #

class DatabaseName a where #

Convenience operations for working with '-NameDB' types.

Since: persistent-2.12.0.0

Methods

escapeWith :: (Text -> str) -> a -> str #

Instances

Instances details
DatabaseName ConstraintNameDB

Since: persistent-2.12.0.0

Instance details

Defined in Database.Persist.Names

Methods

escapeWith :: (Text -> str) -> ConstraintNameDB -> str #

DatabaseName EntityNameDB 
Instance details

Defined in Database.Persist.Names

Methods

escapeWith :: (Text -> str) -> EntityNameDB -> str #

DatabaseName FieldNameDB

Since: persistent-2.12.0.0

Instance details

Defined in Database.Persist.Names

Methods

escapeWith :: (Text -> str) -> FieldNameDB -> str #

data LiteralType #

A type that determines how a backend should handle the literal.

Since: persistent-2.12.0.0

Constructors

Escaped

The accompanying value will be escaped before inserting into the database. This is the correct default choice to use.

Since: persistent-2.12.0.0

Unescaped

The accompanying value will not be escaped when inserting into the database. This is potentially dangerous - use this with care.

Since: persistent-2.12.0.0

DbSpecific

The DbSpecific constructor corresponds to the legacy PersistDbSpecific constructor. We need to keep this around because old databases may have serialized JSON representations that reference this. We don't want to break the ability of a database to load rows.

Since: persistent-2.12.0.0

Instances

Instances details
Read LiteralType 
Instance details

Defined in Database.Persist.PersistValue

Show LiteralType 
Instance details

Defined in Database.Persist.PersistValue

Eq LiteralType 
Instance details

Defined in Database.Persist.PersistValue

Ord LiteralType 
Instance details

Defined in Database.Persist.PersistValue

type Rep LiteralType 
Instance details

Defined in Text.PrettyPrint.GenericPretty.Instance

type Rep LiteralType = D1 ('MetaData "LiteralType" "Database.Persist.PersistValue" "persistent-2.13.3.4-K7QWPYwATzA73w61MYpbGo" 'False) (C1 ('MetaCons "Escaped" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Unescaped" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DbSpecific" 'PrefixI 'False) (U1 :: Type -> Type)))

data PersistValue #

A raw value which can be stored in any backend and can be marshalled to and from a PersistField.

Constructors

PersistText Text 
PersistByteString ByteString 
PersistInt64 Int64 
PersistDouble Double 
PersistRational Rational 
PersistBool Bool 
PersistDay Day 
PersistTimeOfDay TimeOfDay 
PersistUTCTime UTCTime 
PersistNull 
PersistList [PersistValue] 
PersistMap [(Text, PersistValue)] 
PersistObjectId ByteString

Intended especially for MongoDB backend

PersistArray [PersistValue]

Intended especially for PostgreSQL backend for text arrays

PersistLiteral_ LiteralType ByteString

This constructor is used to specify some raw literal value for the backend. The LiteralType value specifies how the value should be escaped. This can be used to make special, custom types avaialable in the back end.

Since: persistent-2.12.0.0

Bundled Patterns

pattern PersistLiteral :: ByteString -> PersistValue

This pattern synonym used to be a data constructor on PersistValue, but was changed into a catch-all pattern synonym to allow backwards compatiblity with database types. See the documentation on PersistDbSpecific for more details.

Since: persistent-2.12.0.0

pattern PersistDbSpecific :: ByteString -> PersistValue

This pattern synonym used to be a data constructor for the PersistValue type. It was changed to be a pattern so that JSON-encoded database values could be parsed into their corresponding values. You should not use this, and instead prefer to pattern match on PersistLiteral_ directly.

If you use this, it will overlap a patern match on the 'PersistLiteral_, PersistLiteral, and PersistLiteralEscaped patterns. If you need to disambiguate between these constructors, pattern match on PersistLiteral_ directly.

Since: persistent-2.12.0.0

pattern PersistLiteralEscaped :: ByteString -> PersistValue

This pattern synonym used to be a data constructor on PersistValue, but was changed into a catch-all pattern synonym to allow backwards compatiblity with database types. See the documentation on PersistDbSpecific for more details.

Since: persistent-2.12.0.0

Instances

Instances details
FromJSON PersistValue 
Instance details

Defined in Database.Persist.PersistValue

ToJSON PersistValue 
Instance details

Defined in Database.Persist.PersistValue

Read PersistValue 
Instance details

Defined in Database.Persist.PersistValue

Show PersistValue 
Instance details

Defined in Database.Persist.PersistValue

Eq PersistValue 
Instance details

Defined in Database.Persist.PersistValue

Ord PersistValue 
Instance details

Defined in Database.Persist.PersistValue

FromHttpApiData PersistValue 
Instance details

Defined in Database.Persist.PersistValue

ToHttpApiData PersistValue 
Instance details

Defined in Database.Persist.PersistValue

PathPiece PersistValue 
Instance details

Defined in Database.Persist.PersistValue

PersistField PersistValue 
Instance details

Defined in Database.Persist.Class.PersistField

PersistFieldSql PersistValue 
Instance details

Defined in Database.Persist.Sql.Class

type Rep PersistValue 
Instance details

Defined in Text.PrettyPrint.GenericPretty.Instance

type Rep PersistValue = D1 ('MetaData "PersistValue" "Database.Persist.PersistValue" "persistent-2.13.3.4-K7QWPYwATzA73w61MYpbGo" 'False) (((C1 ('MetaCons "PersistText" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)) :+: (C1 ('MetaCons "PersistByteString" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ByteString)) :+: C1 ('MetaCons "PersistInt64" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int64)))) :+: ((C1 ('MetaCons "PersistDouble" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Double)) :+: C1 ('MetaCons "PersistRational" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Rational))) :+: (C1 ('MetaCons "PersistBool" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)) :+: C1 ('MetaCons "PersistDay" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Day))))) :+: (((C1 ('MetaCons "PersistTimeOfDay" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 TimeOfDay)) :+: C1 ('MetaCons "PersistUTCTime" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UTCTime))) :+: (C1 ('MetaCons "PersistNull" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PersistList" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [PersistValue])))) :+: ((C1 ('MetaCons "PersistMap" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(Text, PersistValue)])) :+: C1 ('MetaCons "PersistObjectId" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ByteString))) :+: (C1 ('MetaCons "PersistArray" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [PersistValue])) :+: C1 ('MetaCons "PersistLiteral_" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 LiteralType) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ByteString))))))

data FieldDef #

A FieldDef represents the inormation that persistent knows about a field of a datatype. This includes information used to parse the field out of the database and what the field corresponds to.

Constructors

FieldDef 

Fields

Instances

Instances details
Read FieldDef 
Instance details

Defined in Database.Persist.Types.Base

Show FieldDef 
Instance details

Defined in Database.Persist.Types.Base

Eq FieldDef 
Instance details

Defined in Database.Persist.Types.Base

Ord FieldDef 
Instance details

Defined in Database.Persist.Types.Base

Lift FieldDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

lift :: Quote m => FieldDef -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => FieldDef -> Code m FieldDef #

data SqlType #

A SQL data type. Naming attempts to reflect the underlying Haskell datatypes, eg SqlString instead of SqlVarchar. Different SQL databases may have different translations for these types.

Constructors

SqlString 
SqlInt32 
SqlInt64 
SqlReal 
SqlNumeric Word32 Word32 
SqlBool 
SqlDay 
SqlTime 
SqlDayTime

Always uses UTC timezone

SqlBlob 
SqlOther Text

a backend-specific name

Instances

Instances details
Read SqlType 
Instance details

Defined in Database.Persist.Types.Base

Show SqlType 
Instance details

Defined in Database.Persist.Types.Base

Eq SqlType 
Instance details

Defined in Database.Persist.Types.Base

Methods

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

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

Ord SqlType 
Instance details

Defined in Database.Persist.Types.Base

Lift SqlType 
Instance details

Defined in Database.Persist.Types.Base

Methods

lift :: Quote m => SqlType -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => SqlType -> Code m SqlType #

data FieldCascade #

This datatype describes how a foreign reference field cascades deletes or updates.

This type is used in both parsing the model definitions and performing migrations. A Nothing in either of the field values means that the user has not specified a CascadeAction. An unspecified CascadeAction is defaulted to Restrict when doing migrations.

Since: persistent-2.11.0

data ForeignDef #

Constructors

ForeignDef 

Fields

type ForeignFieldDef = (FieldNameHS, FieldNameDB) #

Used instead of FieldDef to generate a smaller amount of code

data UniqueDef #

Type for storing the Uniqueness constraint in the Schema. Assume you have the following schema with a uniqueness constraint:

Person
  name String
  age Int
  UniqueAge age

This will be represented as:

UniqueDef
    { uniqueHaskell = ConstraintNameHS (packPTH UniqueAge)
    , uniqueDBName = ConstraintNameDB (packPTH "unique_age")
    , uniqueFields = [(FieldNameHS (packPTH "age"), FieldNameDB (packPTH "age"))]
    , uniqueAttrs = []
    }

data EmbedFieldDef #

An EmbedFieldDef is the same as a FieldDef But it is only used for embeddedFields so it only has data needed for embedding

Constructors

EmbedFieldDef 

data EmbedEntityDef #

An EmbedEntityDef is the same as an EntityDef But it is only used for fieldReference so it only has data needed for embedding

data ReferenceDef #

There are 3 kinds of references 1) composite (to fields that exist in the record) 2) single field 3) embedded

Constructors

NoReference 
ForeignRef !EntityNameHS

A ForeignRef has a late binding to the EntityDef it references via name and has the Haskell type of the foreign key in the form of FieldType

EmbedRef EntityNameHS 
CompositeRef CompositeDef 
SelfReference

A SelfReference stops an immediate cycle which causes non-termination at compile-time (issue #311).

data FieldType #

A FieldType describes a field parsed from the QuasiQuoter and is used to determine the Haskell type in the generated code.

name Text parses into FTTypeCon Nothing Text

name T.Text parses into FTTypeCon (Just T Text)

name (Jsonb User) parses into:

FTApp (FTTypeCon Nothing Jsonb) (FTTypeCon Nothing User)

Constructors

FTTypeCon (Maybe Text) Text

Optional module and name.

FTTypePromoted Text 
FTApp FieldType FieldType 
FTList FieldType 

data FieldAttr #

Attributes that may be attached to fields that can affect migrations and serialization in backend-specific ways.

While we endeavor to, we can't forsee all use cases for all backends, and so FieldAttr is extensible through its constructor FieldAttrOther.

Since: persistent-2.11.0.0

Constructors

FieldAttrMaybe

The Maybe keyword goes after the type. This indicates that the column is nullable, and the generated Haskell code will have a Maybe type for it.

Example:

User
    name Text Maybe
FieldAttrNullable

This indicates that the column is nullable, but should not have a Maybe type. For this to work out, you need to ensure that the PersistField instance for the type in question can support a PersistNull value.

data What = NoWhat | Hello Text

instance PersistField What where
    fromPersistValue PersistNull =
        pure NoWhat
    fromPersistValue pv =
        Hello $ fromPersistValue pv

instance PersistFieldSql What where
    sqlType _ = SqlString

User
    what What nullable
FieldAttrMigrationOnly

This tag means that the column will not be present on the Haskell code, but will not be removed from the database. Useful to deprecate fields in phases.

You should set the column to be nullable in the database. Otherwise, inserts won't have values.

User
    oldName Text MigrationOnly
    newName Text
FieldAttrSafeToRemove

A SafeToRemove attribute is not present on the Haskell datatype, and the backend migrations should attempt to drop the column without triggering any unsafe migration warnings.

Useful after you've used MigrationOnly to remove a column from the database in phases.

User
    oldName Text SafeToRemove
    newName Text
FieldAttrNoreference

This attribute indicates that we should create a foreign key reference from a column. By default, persistent will try and create a foreign key reference for a column if it can determine that the type of the column is a Key entity or an EntityId and the Entity's name was present in mkPersist.

This is useful if you want to use the explicit foreign key syntax.

Post
    title    Text

Comment
    postId   PostId      noreference
    Foreign Post fk_comment_post postId
FieldAttrReference Text

This is set to specify precisely the database table the column refers to.

Post
    title    Text

Comment
    postId   PostId references="post"

You should not need this - persistent should be capable of correctly determining the target table's name. If you do need this, please file an issue describing why.

FieldAttrConstraint Text

Specify a name for the constraint on the foreign key reference for this table.

Post
    title    Text

Comment
    postId   PostId constraint="my_cool_constraint_name"
FieldAttrDefault Text

Specify the default value for a column.

User
    createdAt    UTCTime     default="NOW()"

Note that a default= attribute does not mean you can omit the value while inserting.

FieldAttrSqltype Text

Specify a custom SQL type for the column. Generally, you should define a custom datatype with a custom PersistFieldSql instance instead of using this.

User
    uuid     Text    sqltype=UUID
FieldAttrMaxlen Integer

Set a maximum length for a column. Useful for VARCHAR and indexes.

User
    name     Text    maxlen=200

    UniqueName name
FieldAttrSql Text

Specify the database name of the column.

User
    blarghle     Int     sql="b_l_a_r_g_h_l_e"

Useful for performing phased migrations, where one column is renamed to another column over time.

FieldAttrOther Text

A grab bag of random attributes that were unrecognized by the parser.

type Attr = Text #

type ExtraLine = [Text] #

data EntityIdDef #

The definition for the entity's primary key ID.

Since: persistent-2.13.0.0

Constructors

EntityIdField !FieldDef

The entity has a single key column, and it is a surrogate key - that is, you can't go from rec -> Key rec.

Since: persistent-2.13.0.0

EntityIdNaturalKey !CompositeDef

The entity has a natural key. This means you can write rec -> Key rec because all the key fields are present on the datatype.

A natural key can have one or more columns.

Since: persistent-2.13.0.0

data EntityDef #

An EntityDef represents the information that persistent knows about an Entity. It uses this information to generate the Haskell datatype, the SQL migrations, and other relevant conversions.

data WhyNullable #

The reason why a field is nullable is very important. A field that is nullable because of a Maybe tag will have its type changed from A to Maybe A. OTOH, a field that is nullable because of a nullable tag will remain with the same type.

Instances

Instances details
Show WhyNullable 
Instance details

Defined in Database.Persist.Types.Base

Eq WhyNullable 
Instance details

Defined in Database.Persist.Types.Base

data IsNullable #

Instances

Instances details
Show IsNullable 
Instance details

Defined in Database.Persist.Types.Base

Eq IsNullable 
Instance details

Defined in Database.Persist.Types.Base

data Checkmark #

A Checkmark should be used as a field type whenever a uniqueness constraint should guarantee that a certain kind of record may appear at most once, but other kinds of records may appear any number of times.

NOTE: You need to mark any Checkmark fields as nullable (see the following example).

For example, suppose there's a Location entity that represents where a user has lived:

Location
    user    UserId
    name    Text
    current Checkmark nullable

    UniqueLocation user current

The UniqueLocation constraint allows any number of Inactive Locations to be current. However, there may be at most one current Location per user (i.e., either zero or one per user).

This data type works because of the way that SQL treats NULLable fields within uniqueness constraints. The SQL standard says that NULL values should be considered different, so we represent Inactive as SQL NULL, thus allowing any number of Inactive records. On the other hand, we represent Active as TRUE, so the uniqueness constraint will disallow more than one Active record.

Note: There may be DBMSs that do not respect the SQL standard's treatment of NULL values on uniqueness constraints, please check if this data type works before relying on it.

The SQL BOOLEAN type is used because it's the smallest data type available. Note that we never use FALSE, just TRUE and NULL. Provides the same behavior Maybe () would if () was a valid PersistField.

Constructors

Active

When used on a uniqueness constraint, there may be at most one Active record.

Inactive

When used on a uniqueness constraint, there may be any number of Inactive records.

Instances

Instances details
Bounded Checkmark 
Instance details

Defined in Database.Persist.Types.Base

Enum Checkmark 
Instance details

Defined in Database.Persist.Types.Base

Read Checkmark 
Instance details

Defined in Database.Persist.Types.Base

Show Checkmark 
Instance details

Defined in Database.Persist.Types.Base

Eq Checkmark 
Instance details

Defined in Database.Persist.Types.Base

Ord Checkmark 
Instance details

Defined in Database.Persist.Types.Base

FromHttpApiData Checkmark 
Instance details

Defined in Database.Persist.Types.Base

ToHttpApiData Checkmark 
Instance details

Defined in Database.Persist.Types.Base

PathPiece Checkmark 
Instance details

Defined in Database.Persist.Types.Base

PersistField Checkmark 
Instance details

Defined in Database.Persist.Class.PersistField

PersistFieldSql Checkmark 
Instance details

Defined in Database.Persist.Sql.Class

entitiesPrimary :: EntityDef -> NonEmpty FieldDef #

Return the [FieldDef] for the entity keys.

keyAndEntityFields :: EntityDef -> NonEmpty FieldDef #

Returns a NonEmpty list of FieldDef that correspond with the key columns for an EntityDef.

parseFieldAttrs :: [Text] -> [FieldAttr] #

Parse raw field attributes into structured form. Any unrecognized attributes will be preserved, identically as they are encountered, as FieldAttrOther values.

Since: persistent-2.11.0.0

isHaskellField :: FieldDef -> Bool #

Returns True if the FieldDef does not have a MigrationOnly or SafeToRemove flag from the QuasiQuoter.

Since: persistent-2.13.0.0

noCascade :: FieldCascade #

A FieldCascade that does nothing.

Since: persistent-2.11.0

renderFieldCascade :: FieldCascade -> Text #

Renders a FieldCascade value such that it can be used in SQL migrations.

Since: persistent-2.11.0

renderCascadeAction :: CascadeAction -> Text #

Render a CascadeAction to Text such that it can be used in a SQL command.

Since: persistent-2.11.0

setFieldAttrs :: [FieldAttr] -> FieldDef -> FieldDef #

Replace the FieldDef FieldAttr with the new list.

Since: persistent-2.13.0.0

overFieldAttrs :: ([FieldAttr] -> [FieldAttr]) -> FieldDef -> FieldDef #

Modify the list of field attributes.

Since: persistent-2.13.0.0

addFieldAttr :: FieldAttr -> FieldDef -> FieldDef #

Add an attribute to the list of field attributes.

Since: persistent-2.13.0.0

isFieldNullable :: FieldDef -> IsNullable #

Check if the field definition is nullable

Since: persistent-2.13.0.0

isFieldMaybe :: FieldDef -> Bool #

Check if the field is `Maybe a`

Since: persistent-2.13.0.0

getEntityUniques :: EntityDef -> [UniqueDef] #

Retrieve the list of UniqueDef from an EntityDef. This currently does not include a Primary key, if one is defined. A future version of persistent will include a Primary key among the Unique constructors for the Entity.

Since: persistent-2.13.0.0

getEntityHaskellName :: EntityDef -> EntityNameHS #

Retrieve the Haskell name of the given entity.

Since: persistent-2.13.0.0

getEntityDBName :: EntityDef -> EntityNameDB #

Return the database name for the given entity.

Since: persistent-2.13.0.0

setEntityDBName :: EntityNameDB -> EntityDef -> EntityDef #

Since: persistent-2.13.0.0

getEntityForeignDefs :: EntityDef -> [ForeignDef] #

Since: persistent-2.13.0.0

getEntityFields :: EntityDef -> [FieldDef] #

Retrieve the list of FieldDef that makes up the fields of the entity.

This does not return the fields for an Id column or an implicit id. It will return the key columns if you used the Primary syntax for defining the primary key.

This does not return fields that are marked SafeToRemove or MigrationOnly - so it only returns fields that are represented in the Haskell type. If you need those fields, use getEntityFieldsDatabase.

Since: persistent-2.13.0.0

getEntityFieldsDatabase :: EntityDef -> [FieldDef] #

This returns all of the FieldDef defined for the EntityDef, including those fields that are marked as MigrationOnly (and therefore only present in the database) or SafeToRemove (and a migration will drop the column if it exists in the database).

For all the fields that are present on the Haskell-type, see getEntityFields.

Since: persistent-2.13.0.0

isEntitySum :: EntityDef -> Bool #

Since: persistent-2.13.0.0

getEntityId :: EntityDef -> EntityIdDef #

Since: persistent-2.13.0.0

getEntityIdField :: EntityDef -> Maybe FieldDef #

Since: persistent-2.13.0.0

setEntityId :: FieldDef -> EntityDef -> EntityDef #

Set an entityId to be the given FieldDef.

Since: persistent-2.13.0.0

setEntityIdDef :: EntityIdDef -> EntityDef -> EntityDef #

Since: persistent-2.13.0.0

getEntityKeyFields :: EntityDef -> NonEmpty FieldDef #

Since: persistent-2.13.0.0

overEntityFields :: ([FieldDef] -> [FieldDef]) -> EntityDef -> EntityDef #

Perform a mapping function over all of the entity fields, as determined by getEntityFieldsDatabase.

Since: persistent-2.13.0.0

newtype OverflowNatural #

Prior to persistent-2.11.0, we provided an instance of PersistField for the Natural type. This was in error, because Natural represents an infinite value, and databases don't have reasonable types for this.

The instance for Natural used the Int64 underlying type, which will cause underflow and overflow errors. This type has the exact same code in the instances, and will work seamlessly.

A more appropriate type for this is the Word series of types from Data.Word. These have a bounded size, are guaranteed to be non-negative, and are quite efficient for the database to store.

Since: persistent-2.11.0

Constructors

OverflowNatural 

Instances

Instances details
Num OverflowNatural 
Instance details

Defined in Database.Persist.Class.PersistField

Show OverflowNatural 
Instance details

Defined in Database.Persist.Class.PersistField

Eq OverflowNatural 
Instance details

Defined in Database.Persist.Class.PersistField

Ord OverflowNatural 
Instance details

Defined in Database.Persist.Class.PersistField

PersistField OverflowNatural 
Instance details

Defined in Database.Persist.Class.PersistField

PersistFieldSql OverflowNatural

This type uses the SqlInt64 version, which will exhibit overflow and underflow behavior. Additionally, it permits negative values in the database, which isn't ideal.

Since: persistent-2.11.0

Instance details

Defined in Database.Persist.Sql.Class

class PersistField a where #

This class teaches Persistent how to take a custom type and marshal it to and from a PersistValue, allowing it to be stored in a database.

Examples

Expand
Simple Newtype

You can use newtype to add more type safety/readability to a basis type like ByteString. In these cases, just derive PersistField and PersistFieldSql:

{-# LANGUAGE GeneralizedNewtypeDeriving #-}

newtype HashedPassword = HashedPassword ByteString
  deriving (Eq, Show, PersistField, PersistFieldSql)
Smart Constructor Newtype

In this example, we create a PersistField instance for a newtype following the "Smart Constructor" pattern.

{-# LANGUAGE GeneralizedNewtypeDeriving #-}
import qualified Data.Text as T
import qualified Data.Char as C

-- | An American Social Security Number
newtype SSN = SSN Text
 deriving (Eq, Show, PersistFieldSql)

mkSSN :: Text -> Either Text SSN
mkSSN t = if (T.length t == 9) && (T.all C.isDigit t)
 then Right $ SSN t
 else Left $ "Invalid SSN: " <> t

instance PersistField SSN where
  toPersistValue (SSN t) = PersistText t
  fromPersistValue (PersistText t) = mkSSN t
  -- Handle cases where the database does not give us PersistText
  fromPersistValue x = Left $ "File.hs: When trying to deserialize an SSN: expected PersistText, received: " <> T.pack (show x)

Tips:

  • This file contain dozens of PersistField instances you can look at for examples.
  • Typically custom PersistField instances will only accept a single PersistValue constructor in fromPersistValue.
  • Internal PersistField instances accept a wide variety of PersistValues to accomodate e.g. storing booleans as integers, booleans or strings.
  • If you're making a custom instance and using a SQL database, you'll also need PersistFieldSql to specify the type of the database column.

Instances

Instances details
PersistField Int16 
Instance details

Defined in Database.Persist.Class.PersistField

PersistField Int32 
Instance details

Defined in Database.Persist.Class.PersistField

PersistField Int64 
Instance details

Defined in Database.Persist.Class.PersistField

PersistField Int8 
Instance details

Defined in Database.Persist.Class.PersistField

PersistField Rational 
Instance details

Defined in Database.Persist.Class.PersistField

PersistField Word16 
Instance details

Defined in Database.Persist.Class.PersistField

PersistField Word32 
Instance details

Defined in Database.Persist.Class.PersistField

PersistField Word64 
Instance details

Defined in Database.Persist.Class.PersistField

PersistField Html 
Instance details

Defined in Database.Persist.Class.PersistField

PersistField BlkHash Source # 
Instance details

Defined in BtcLsp.Data.Type

PersistField BlkHeight Source # 
Instance details

Defined in BtcLsp.Data.Type

PersistField BlkStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

PersistField LnChanStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

PersistField LnInvoiceStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

PersistField Nonce Source # 
Instance details

Defined in BtcLsp.Data.Type

PersistField Privacy Source # 
Instance details

Defined in BtcLsp.Data.Type

PersistField SwapStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

PersistField SwapUtxoStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

PersistField UtxoLockId Source # 
Instance details

Defined in BtcLsp.Data.Type

PersistField Block Source # 
Instance details

Defined in BtcLsp.Storage.Model

PersistField LnChan Source # 
Instance details

Defined in BtcLsp.Storage.Model

PersistField SwapIntoLn Source # 
Instance details

Defined in BtcLsp.Storage.Model

PersistField SwapUtxo Source # 
Instance details

Defined in BtcLsp.Storage.Model

PersistField User Source # 
Instance details

Defined in BtcLsp.Storage.Model

PersistField Code Source # 
Instance details

Defined in BtcLsp.Yesod.Data.Language

PersistField ByteString 
Instance details

Defined in Database.Persist.Class.PersistField

PersistField SingleChanBackupBlob 
Instance details

Defined in LndClient.Data.ChannelBackup

Methods

toPersistValue :: SingleChanBackupBlob -> PersistValue #

fromPersistValue :: PersistValue -> Either Text SingleChanBackupBlob #

PersistField LndHexMacaroon 
Instance details

Defined in LndClient.Data.LndEnv

Methods

toPersistValue :: LndHexMacaroon -> PersistValue #

fromPersistValue :: PersistValue -> Either Text LndHexMacaroon #

PersistField LndHost' 
Instance details

Defined in LndClient.Data.LndEnv

PersistField LndPort' 
Instance details

Defined in LndClient.Data.LndEnv

PersistField LndWalletPassword 
Instance details

Defined in LndClient.Data.LndEnv

Methods

toPersistValue :: LndWalletPassword -> PersistValue #

fromPersistValue :: PersistValue -> Either Text LndWalletPassword #

PersistField AddIndex 
Instance details

Defined in LndClient.Data.Newtype

PersistField AezeedPassphrase 
Instance details

Defined in LndClient.Data.Newtype

Methods

toPersistValue :: AezeedPassphrase -> PersistValue #

fromPersistValue :: PersistValue -> Either Text AezeedPassphrase #

PersistField ChanId 
Instance details

Defined in LndClient.Data.Newtype

PersistField CipherSeedMnemonic 
Instance details

Defined in LndClient.Data.Newtype

Methods

toPersistValue :: CipherSeedMnemonic -> PersistValue #

fromPersistValue :: PersistValue -> Either Text CipherSeedMnemonic #

PersistField MSat 
Instance details

Defined in LndClient.Data.Newtype

PersistField NodeLocation 
Instance details

Defined in LndClient.Data.Newtype

Methods

toPersistValue :: NodeLocation -> PersistValue #

fromPersistValue :: PersistValue -> Either Text NodeLocation #

PersistField NodePubKey 
Instance details

Defined in LndClient.Data.Newtype

PersistField PaymentRequest 
Instance details

Defined in LndClient.Data.Newtype

Methods

toPersistValue :: PaymentRequest -> PersistValue #

fromPersistValue :: PersistValue -> Either Text PaymentRequest #

PersistField PendingChannelId 
Instance details

Defined in LndClient.Data.Newtype

Methods

toPersistValue :: PendingChannelId -> PersistValue #

fromPersistValue :: PersistValue -> Either Text PendingChannelId #

PersistField Psbt 
Instance details

Defined in LndClient.Data.Newtype

PersistField RHash 
Instance details

Defined in LndClient.Data.Newtype

PersistField RPreimage 
Instance details

Defined in LndClient.Data.Newtype

PersistField RawTx 
Instance details

Defined in LndClient.Data.Newtype

PersistField Seconds 
Instance details

Defined in LndClient.Data.Newtype

PersistField SettleIndex 
Instance details

Defined in LndClient.Data.Newtype

Methods

toPersistValue :: SettleIndex -> PersistValue #

fromPersistValue :: PersistValue -> Either Text SettleIndex #

PersistField LnInitiator 
Instance details

Defined in LndClient.Data.Type

Methods

toPersistValue :: LnInitiator -> PersistValue #

fromPersistValue :: PersistValue -> Either Text LnInitiator #

PersistField OverflowNatural 
Instance details

Defined in Database.Persist.Class.PersistField

PersistField SomePersistField 
Instance details

Defined in Database.Persist.Class.PersistField

PersistField PersistValue 
Instance details

Defined in Database.Persist.Class.PersistField

PersistField Checkmark 
Instance details

Defined in Database.Persist.Class.PersistField

PersistField Text 
Instance details

Defined in Database.Persist.Class.PersistField

PersistField Text 
Instance details

Defined in Database.Persist.Class.PersistField

PersistField Day 
Instance details

Defined in Database.Persist.Class.PersistField

PersistField UTCTime 
Instance details

Defined in Database.Persist.Class.PersistField

PersistField TimeOfDay 
Instance details

Defined in Database.Persist.Class.PersistField

PersistField Textarea 
Instance details

Defined in Yesod.Form.Fields

PersistField Word8 
Instance details

Defined in Database.Persist.Class.PersistField

(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

PersistField Bool 
Instance details

Defined in Database.Persist.Class.PersistField

PersistField Double 
Instance details

Defined in Database.Persist.Class.PersistField

PersistField Int 
Instance details

Defined in Database.Persist.Class.PersistField

PersistField Word 
Instance details

Defined in Database.Persist.Class.PersistField

PersistField (OnChainAddress mrel) Source # 
Instance details

Defined in BtcLsp.Data.Smart

PersistField (LnInvoice mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

PersistField (UnsafeOnChainAddress mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

PersistField (Uuid tab) Source # 
Instance details

Defined in BtcLsp.Data.Type

PersistField v => PersistField (IntMap v) 
Instance details

Defined in Database.Persist.Class.PersistField

(Ord a, PersistField a) => PersistField (Set a) 
Instance details

Defined in Database.Persist.Class.PersistField

PersistField (TxId a) 
Instance details

Defined in LndClient.Data.Newtype

PersistField (Vout a) 
Instance details

Defined in LndClient.Data.Newtype

(PersistEntity record, PersistField record, PersistField (Key record)) => PersistField (Entity record) 
Instance details

Defined in Database.Persist.Class.PersistEntity

PersistField (Key Block) Source # 
Instance details

Defined in BtcLsp.Storage.Model

PersistField (Key LnChan) Source # 
Instance details

Defined in BtcLsp.Storage.Model

PersistField (Key SwapIntoLn) Source # 
Instance details

Defined in BtcLsp.Storage.Model

PersistField (Key SwapUtxo) Source # 
Instance details

Defined in BtcLsp.Storage.Model

PersistField (Key User) Source # 
Instance details

Defined in BtcLsp.Storage.Model

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

Defined in Database.Persist.Compatible.Types

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

Defined in Database.Persist.Postgresql

PersistField a => PersistField (Vector a) 
Instance details

Defined in Database.Persist.Class.PersistField

PersistField a => PersistField (Maybe a) 
Instance details

Defined in Database.Persist.Class.PersistField

PersistField [Char] 
Instance details

Defined in Database.Persist.Class.PersistField

PersistField a => PersistField [a] 
Instance details

Defined in Database.Persist.Class.PersistField

HasResolution a => PersistField (Fixed a) 
Instance details

Defined in Database.Persist.Class.PersistField

PersistField v => PersistField (Map Text v) 
Instance details

Defined in Database.Persist.Class.PersistField

(PersistField a, PersistField b) => PersistField (a, b) 
Instance details

Defined in Database.Persist.Class.PersistField

PersistField (Money owner btcl mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

toPersistValue :: Money owner btcl mrel -> PersistValue #

fromPersistValue :: PersistValue -> Either Text (Money owner btcl mrel) #

getPersistMap :: PersistValue -> Either Text [(Text, PersistValue)] #

FIXME Add documentation to that.

class SymbolToField (sym :: Symbol) rec typ | sym rec -> typ where #

This type class is used with the OverloadedLabels extension to provide a more convenient means of using the EntityField type. EntityField definitions are prefixed with the type name to avoid ambiguity, but this ambiguity can result in verbose code.

If you have a table User with a name Text field, then the corresponding EntityField is UserName. With this, we can write #name :: EntityField User Text.

What's more fun is that the type is more general: it's actually #name :: (SymbolToField "name" rec typ) => EntityField rec typ

Which means it is *polymorphic* over the actual record. This allows you to write code that can be generic over the tables, provided they have the right fields.

Since: persistent-2.11.0.0

Methods

symbolToField :: EntityField rec typ #

Instances

Instances details
SymbolToField "blockId" SwapUtxo BlockId Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "expiresAt" SwapIntoLn UTCTime Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "hash" Block BlkHash Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "height" Block BlkHeight 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 "latestNonce" User Nonce Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "nodePubKey" User NodePubKey Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "privacy" SwapIntoLn Privacy Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "status" Block BlkStatus Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "status" LnChan LnChanStatus Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "status" SwapIntoLn SwapStatus Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "status" SwapUtxo SwapUtxoStatus Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "swapIntoLnId" SwapUtxo SwapIntoLnId Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "totalSatoshisReceived" LnChan MSat Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "totalSatoshisSent" LnChan MSat 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

SymbolToField "userId" SwapIntoLn UserId Source # 
Instance details

Defined in BtcLsp.Storage.Model

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 "fundAddress" SwapIntoLn (OnChainAddress 'Fund) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "fundingTxId" LnChan (TxId 'Funding) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "fundingVout" LnChan (Vout 'Funding) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "id" Block (Key Block) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "id" LnChan (Key LnChan) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "id" SwapIntoLn (Key SwapIntoLn) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "id" SwapUtxo (Key SwapUtxo) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "id" User (Key User) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "lockId" SwapUtxo (Maybe UtxoLockId) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "lspFeeAndChangeAddress" SwapIntoLn (OnChainAddress 'Gain) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "refundAddress" SwapIntoLn (OnChainAddress 'Refund) 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

SymbolToField "txid" SwapUtxo (TxId 'Funding) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "uuid" SwapIntoLn (Uuid 'SwapIntoLnTable) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "vout" SwapUtxo (Vout 'Funding) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "amount" SwapUtxo (Money 'Usr 'OnChain 'Fund) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "chanCapLsp" SwapIntoLn (Money 'Lsp 'Ln 'Fund) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "chanCapUser" SwapIntoLn (Money 'Usr 'Ln 'Fund) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "feeLsp" SwapIntoLn (Money 'Lsp 'OnChain 'Gain) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "feeMiner" SwapIntoLn (Money 'Lsp 'OnChain 'Loss) Source # 
Instance details

Defined in BtcLsp.Storage.Model

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

data FilterValue typ where #

Value to filter with. Highly dependant on the type of filter used.

Since: persistent-2.10.0

Constructors

FilterValue :: forall typ. typ -> FilterValue typ 
FilterValues :: forall typ. [typ] -> FilterValue typ 
UnsafeValue :: forall a typ. PersistField a => a -> FilterValue typ 

data Filter record #

Filters which are available for select, updateWhere and deleteWhere. Each filter constructor specifies the field being filtered on, the type of comparison applied (equals, not equals, etc) and the argument for the comparison.

Persistent users use combinators to create these.

Note that it's important to be careful about the PersistFilter that you are using, if you use this directly. For example, using the In PersistFilter requires that you have an array- or list-shaped EntityField. It is possible to construct values using this that will create malformed runtime values.

Constructors

PersistField typ => Filter 
FilterAnd [Filter record]

convenient for internal use, not needed for the API

FilterOr [Filter record] 
BackendFilter (BackendSpecificFilter (PersistEntityBackend record) record) 

type family BackendSpecificFilter backend record #

data SelectOpt record #

Query options.

Persistent users use these directly.

Constructors

Asc (EntityField record typ) 
Desc (EntityField record typ) 
OffsetBy Int 
LimitTo Int 

data Update record #

Updating a database entity.

Persistent users use combinators to create these.

type family BackendSpecificUpdate backend record #

class (PersistField (Key record), ToJSON (Key record), FromJSON (Key record), Show (Key record), Read (Key record), Eq (Key record), Ord (Key record)) => PersistEntity record where #

Persistent serialized Haskell records to the database. A Database Entity (A row in SQL, a document in MongoDB, etc) corresponds to a Key plus a Haskell record.

For every Haskell record type stored in the database there is a corresponding PersistEntity instance. An instance of PersistEntity contains meta-data for the record. PersistEntity also helps abstract over different record types. That way the same query interface can return a PersistEntity, with each query returning different types of Haskell records.

Some advanced type system capabilities are used to make this process type-safe. Persistent users usually don't need to understand the class associated data and functions.

Associated Types

type PersistEntityBackend record #

Persistent allows multiple different backends (databases).

data Key record #

By default, a backend will automatically generate the key Instead you can specify a Primary key made up of unique values.

data EntityField record :: Type -> Type #

An EntityField is parameterised by the Haskell record it belongs to and the additional type of that field.

As of persistent-2.11.0.0, it's possible to use the OverloadedLabels language extension to refer to EntityField values polymorphically. See the documentation on SymbolToField for more information.

data Unique record #

Unique keys besides the Key.

Methods

keyToValues :: Key record -> [PersistValue] #

A lower-level key operation.

keyFromValues :: [PersistValue] -> Either Text (Key record) #

A lower-level key operation.

persistIdField :: EntityField record (Key record) #

A meta-operation to retrieve the Key EntityField.

entityDef :: proxy record -> EntityDef #

Retrieve the EntityDef meta-data for the record.

persistFieldDef :: EntityField record typ -> FieldDef #

Return meta-data for a given EntityField.

toPersistFields :: record -> [SomePersistField] #

A meta-operation to get the database fields of a record.

fromPersistValues :: [PersistValue] -> Either Text record #

A lower-level operation to convert from database values to a Haskell record.

persistUniqueKeys :: record -> [Unique record] #

A meta operation to retrieve all the Unique keys.

persistUniqueToFieldNames :: Unique record -> NonEmpty (FieldNameHS, FieldNameDB) #

A lower level operation.

persistUniqueToValues :: Unique record -> [PersistValue] #

A lower level operation.

fieldLens :: EntityField record field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity record -> f (Entity record) #

Use a PersistField as a lens.

keyFromRecordM :: Maybe (record -> Key record) #

Extract a Key record from a record value. Currently, this is only defined for entities using the Primary syntax for natural/composite keys. In a future version of persistent which incorporates the ID directly into the entity, this will always be Just.

Since: persistent-2.11.0.0

Instances

Instances details
PersistEntity Block Source # 
Instance details

Defined in BtcLsp.Storage.Model

Associated Types

type PersistEntityBackend Block #

data Key Block #

data EntityField Block :: Type -> Type #

data Unique Block #

PersistEntity LnChan Source # 
Instance details

Defined in BtcLsp.Storage.Model

Associated Types

type PersistEntityBackend LnChan #

data Key LnChan #

data EntityField LnChan :: Type -> Type #

data Unique LnChan #

PersistEntity SwapIntoLn Source # 
Instance details

Defined in BtcLsp.Storage.Model

PersistEntity SwapUtxo Source # 
Instance details

Defined in BtcLsp.Storage.Model

PersistEntity User Source # 
Instance details

Defined in BtcLsp.Storage.Model

Associated Types

type PersistEntityBackend User #

data Key User #

data EntityField User :: Type -> Type #

data Unique User #

type family PersistEntityBackend record #

Persistent allows multiple different backends (databases).

data family Key record #

By default, a backend will automatically generate the key Instead you can specify a Primary key made up of unique values.

Instances

Instances details
SymbolToField "blockId" SwapUtxo BlockId Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "swapIntoLnId" SwapUtxo SwapIntoLnId Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "userId" SwapIntoLn UserId Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "id" Block (Key Block) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "id" LnChan (Key LnChan) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "id" SwapIntoLn (Key SwapIntoLn) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "id" SwapUtxo (Key SwapUtxo) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "id" User (Key User) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "refundBlockId" SwapUtxo (Maybe BlockId) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "swapIntoLnId" LnChan (Maybe SwapIntoLnId) Source # 
Instance details

Defined in BtcLsp.Storage.Model

ToBackendKey SqlBackend a => TryFrom Natural (Key a) Source # 
Instance details

Defined in BtcLsp.Data.Orphan

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 #

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

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

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 #

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

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 #

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 #

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 #

FromHttpApiData (Key Block) Source # 
Instance details

Defined in BtcLsp.Storage.Model

FromHttpApiData (Key LnChan) Source # 
Instance details

Defined in BtcLsp.Storage.Model

FromHttpApiData (Key SwapIntoLn) Source # 
Instance details

Defined in BtcLsp.Storage.Model

FromHttpApiData (Key SwapUtxo) Source # 
Instance details

Defined in BtcLsp.Storage.Model

FromHttpApiData (Key User) Source # 
Instance details

Defined in BtcLsp.Storage.Model

ToHttpApiData (Key Block) Source # 
Instance details

Defined in BtcLsp.Storage.Model

ToHttpApiData (Key LnChan) Source # 
Instance details

Defined in BtcLsp.Storage.Model

ToHttpApiData (Key SwapIntoLn) Source # 
Instance details

Defined in BtcLsp.Storage.Model

ToHttpApiData (Key SwapUtxo) Source # 
Instance details

Defined in BtcLsp.Storage.Model

ToHttpApiData (Key User) Source # 
Instance details

Defined in BtcLsp.Storage.Model

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

PersistField (Key Block) Source # 
Instance details

Defined in BtcLsp.Storage.Model

PersistField (Key LnChan) Source # 
Instance details

Defined in BtcLsp.Storage.Model

PersistField (Key SwapIntoLn) Source # 
Instance details

Defined in BtcLsp.Storage.Model

PersistField (Key SwapUtxo) Source # 
Instance details

Defined in BtcLsp.Storage.Model

PersistField (Key User) Source # 
Instance details

Defined in BtcLsp.Storage.Model

PersistFieldSql (Key Block) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Methods

sqlType :: Proxy (Key Block) -> SqlType #

PersistFieldSql (Key LnChan) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Methods

sqlType :: Proxy (Key LnChan) -> SqlType #

PersistFieldSql (Key SwapIntoLn) Source # 
Instance details

Defined in BtcLsp.Storage.Model

PersistFieldSql (Key SwapUtxo) Source # 
Instance details

Defined in BtcLsp.Storage.Model

PersistFieldSql (Key User) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Methods

sqlType :: Proxy (Key User) -> SqlType #

(PersistEntity a, PersistEntityBackend a ~ backend, IsPersistBackend backend) => RawSql (Key a) 
Instance details

Defined in Database.Persist.Sql.Class

ToBackendKey SqlBackend a => TryFrom (Key a) Natural Source # 
Instance details

Defined in BtcLsp.Data.Orphan

newtype Key Block Source # 
Instance details

Defined in BtcLsp.Storage.Model

newtype Key LnChan Source # 
Instance details

Defined in BtcLsp.Storage.Model

newtype Key SwapIntoLn Source # 
Instance details

Defined in BtcLsp.Storage.Model

newtype Key SwapUtxo Source # 
Instance details

Defined in BtcLsp.Storage.Model

newtype Key User Source # 
Instance details

Defined in BtcLsp.Storage.Model

type Rep (Key Block) Source # 
Instance details

Defined in BtcLsp.Storage.Model

type Rep (Key Block) = D1 ('MetaData "Key" "BtcLsp.Storage.Model" "btc-lsp-0.1.0.0-inplace" 'True) (C1 ('MetaCons "BlockKey" 'PrefixI 'True) (S1 ('MetaSel ('Just "unBlockKey") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (BackendKey SqlBackend))))
type Rep (Key LnChan) Source # 
Instance details

Defined in BtcLsp.Storage.Model

type Rep (Key LnChan) = D1 ('MetaData "Key" "BtcLsp.Storage.Model" "btc-lsp-0.1.0.0-inplace" 'True) (C1 ('MetaCons "LnChanKey" 'PrefixI 'True) (S1 ('MetaSel ('Just "unLnChanKey") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (BackendKey SqlBackend))))
type Rep (Key SwapIntoLn) Source # 
Instance details

Defined in BtcLsp.Storage.Model

type Rep (Key SwapIntoLn) = D1 ('MetaData "Key" "BtcLsp.Storage.Model" "btc-lsp-0.1.0.0-inplace" 'True) (C1 ('MetaCons "SwapIntoLnKey" 'PrefixI 'True) (S1 ('MetaSel ('Just "unSwapIntoLnKey") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (BackendKey SqlBackend))))
type Rep (Key SwapUtxo) Source # 
Instance details

Defined in BtcLsp.Storage.Model

type Rep (Key SwapUtxo) = D1 ('MetaData "Key" "BtcLsp.Storage.Model" "btc-lsp-0.1.0.0-inplace" 'True) (C1 ('MetaCons "SwapUtxoKey" 'PrefixI 'True) (S1 ('MetaSel ('Just "unSwapUtxoKey") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (BackendKey SqlBackend))))
type Rep (Key User) Source # 
Instance details

Defined in BtcLsp.Storage.Model

type Rep (Key User) = D1 ('MetaData "Key" "BtcLsp.Storage.Model" "btc-lsp-0.1.0.0-inplace" 'True) (C1 ('MetaCons "UserKey" 'PrefixI 'True) (S1 ('MetaSel ('Just "unUserKey") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (BackendKey SqlBackend))))
type KeyEntity (Key x) 
Instance details

Defined in Yesod.Auth

type KeyEntity (Key x) = x

data family EntityField record :: Type -> Type #

An EntityField is parameterised by the Haskell record it belongs to and the additional type of that field.

As of persistent-2.11.0.0, it's possible to use the OverloadedLabels language extension to refer to EntityField values polymorphically. See the documentation on SymbolToField for more information.

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 #

data EntityField Block typ Source # 
Instance details

Defined in BtcLsp.Storage.Model

data EntityField LnChan typ Source # 
Instance details

Defined in BtcLsp.Storage.Model

data EntityField SwapIntoLn typ Source # 
Instance details

Defined in BtcLsp.Storage.Model

data EntityField SwapUtxo typ Source # 
Instance details

Defined in BtcLsp.Storage.Model

data EntityField User typ Source # 
Instance details

Defined in BtcLsp.Storage.Model

data family Unique record #

Unique keys besides the Key.

Instances

Instances details
FinalResult (Unique val) 
Instance details

Defined in Database.Esqueleto.Internal.Internal

Methods

finalR :: Unique val -> KnowResult (Unique val) #

data Unique Block Source # 
Instance details

Defined in BtcLsp.Storage.Model

data Unique LnChan Source # 
Instance details

Defined in BtcLsp.Storage.Model

data Unique SwapIntoLn Source # 
Instance details

Defined in BtcLsp.Storage.Model

data Unique SwapUtxo Source # 
Instance details

Defined in BtcLsp.Storage.Model

data Unique User Source # 
Instance details

Defined in BtcLsp.Storage.Model

entityValues :: PersistEntity record => Entity record -> [PersistValue] #

Get list of values corresponding to given entity.

keyValueEntityToJSON :: (PersistEntity record, ToJSON record) => Entity record -> Value #

Predefined toJSON. The resulting JSON looks like {"key": 1, "value": {"name": ...}}.

The typical usage is:

instance ToJSON (Entity User) where
    toJSON = keyValueEntityToJSON

keyValueEntityFromJSON :: (PersistEntity record, FromJSON record) => Value -> Parser (Entity record) #

Predefined parseJSON. The input JSON looks like {"key": 1, "value": {"name": ...}}.

The typical usage is:

instance FromJSON (Entity User) where
    parseJSON = keyValueEntityFromJSON

entityIdToJSON :: (PersistEntity record, ToJSON record) => Entity record -> Value #

Predefined toJSON. The resulting JSON looks like {"id": 1, "name": ...}.

The typical usage is:

instance ToJSON (Entity User) where
    toJSON = entityIdToJSON

entityIdFromJSON :: (PersistEntity record, FromJSON record) => Value -> Parser (Entity record) #

Predefined parseJSON. The input JSON looks like {"id": 1, "name": ...}.

The typical usage is:

instance FromJSON (Entity User) where
    parseJSON = entityIdFromJSON

toPersistValueJSON :: ToJSON a => a -> PersistValue #

Convenience function for getting a free PersistField instance from a type with JSON instances.

Example usage in combination with fromPersistValueJSON:

instance PersistField MyData where
  fromPersistValue = fromPersistValueJSON
  toPersistValue = toPersistValueJSON

fromPersistValueJSON :: FromJSON a => PersistValue -> Either Text a #

Convenience function for getting a free PersistField instance from a type with JSON instances. The JSON parser used will accept JSON values other that object and arrays. So, if your instance serializes the data to a JSON string, this will still work.

Example usage in combination with toPersistValueJSON:

instance PersistField MyData where
  fromPersistValue = fromPersistValueJSON
  toPersistValue = toPersistValueJSON

class (Show (BackendKey backend), Read (BackendKey backend), Eq (BackendKey backend), Ord (BackendKey backend), PersistStoreRead backend, PersistField (BackendKey backend), ToJSON (BackendKey backend), FromJSON (BackendKey backend)) => PersistStoreWrite backend where #

Minimal complete definition

insert, insertKey, repsert, replace, delete, update

Methods

insert :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record backend) => record -> ReaderT backend m (Key record) #

Create a new record in the database, returning an automatically created key (in SQL an auto-increment id).

Example usage

Expand

Using schema-1 and dataset-1, let's insert a new user John.

insertJohn :: MonadIO m => ReaderT SqlBackend m (Key User)
insertJohn = insert $ User "John" 30
johnId <- insertJohn

The above query when applied on dataset-1, will produce this:

+-----+------+-----+
|id   |name  |age  |
+-----+------+-----+
|1    |SPJ   |40   |
+-----+------+-----+
|2    |Simon |41   |
+-----+------+-----+
|3    |John  |30   |
+-----+------+-----+

insert_ :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record backend) => record -> ReaderT backend m () #

Same as insert, but doesn't return a Key.

Example usage

Expand

with schema-1 and dataset-1,

insertJohn :: MonadIO m => ReaderT SqlBackend m (Key User)
insertJohn = insert_ $ User "John" 30

The above query when applied on dataset-1, will produce this:

+-----+------+-----+
|id   |name  |age  |
+-----+------+-----+
|1    |SPJ   |40   |
+-----+------+-----+
|2    |Simon |41   |
+-----+------+-----+
|3    |John  |30   |
+-----+------+-----+

insertMany :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record backend) => [record] -> ReaderT backend m [Key record] #

Create multiple records in the database and return their Keys.

If you don't need the inserted Keys, use insertMany_.

The MongoDB and PostgreSQL backends insert all records and retrieve their keys in one database query.

The SQLite and MySQL backends use the slow, default implementation of mapM insert.

Example usage

Expand

with schema-1 and dataset-1,

insertUsers :: MonadIO m => ReaderT SqlBackend m [Key User]
insertUsers = insertMany [User "John" 30, User "Nick" 32, User "Jane" 20]
userIds <- insertUsers

The above query when applied on dataset-1, will produce this:

+-----+------+-----+
|id   |name  |age  |
+-----+------+-----+
|1    |SPJ   |40   |
+-----+------+-----+
|2    |Simon |41   |
+-----+------+-----+
|3    |John  |30   |
+-----+------+-----+
|4    |Nick  |32   |
+-----+------+-----+
|5    |Jane  |20   |
+-----+------+-----+

insertMany_ :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record backend) => [record] -> ReaderT backend m () #

Same as insertMany, but doesn't return any Keys.

The MongoDB, PostgreSQL, SQLite and MySQL backends insert all records in one database query.

Example usage

Expand

With schema-1 and dataset-1,

insertUsers_ :: MonadIO m => ReaderT SqlBackend m ()
insertUsers_ = insertMany_ [User "John" 30, User "Nick" 32, User "Jane" 20]

The above query when applied on dataset-1, will produce this:

+-----+------+-----+
|id   |name  |age  |
+-----+------+-----+
|1    |SPJ   |40   |
+-----+------+-----+
|2    |Simon |41   |
+-----+------+-----+
|3    |John  |30   |
+-----+------+-----+
|4    |Nick  |32   |
+-----+------+-----+
|5    |Jane  |20   |
+-----+------+-----+

insertEntityMany :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record backend) => [Entity record] -> ReaderT backend m () #

Same as insertMany_, but takes an Entity instead of just a record.

Useful when migrating data from one entity to another and want to preserve ids.

The MongoDB, PostgreSQL, SQLite and MySQL backends insert all records in one database query.

Example usage

Expand

With schema-1 and dataset-1,

insertUserEntityMany :: MonadIO m => ReaderT SqlBackend m ()
insertUserEntityMany = insertEntityMany [SnakeEntity, EvaEntity]

The above query when applied on dataset-1, will produce this:

+-----+------+-----+
|id   |name  |age  |
+-----+------+-----+
|1    |SPJ   |40   |
+-----+------+-----+
|2    |Simon |41   |
+-----+------+-----+
|3    |Snake |38   |
+-----+------+-----+
|4    |Eva   |38   |
+-----+------+-----+

insertKey :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record backend) => Key record -> record -> ReaderT backend m () #

Create a new record in the database using the given key.

Example usage

Expand

With schema-1 and dataset-1,

insertAliceKey :: MonadIO m => Key User -> ReaderT SqlBackend m ()
insertAliceKey key = insertKey key $ User "Alice" 20
insertAliceKey $ UserKey {unUserKey = SqlBackendKey {unSqlBackendKey = 3}}

The above query when applied on dataset-1, will produce this:

+-----+------+-----+
|id   |name  |age  |
+-----+------+-----+
|1    |SPJ   |40   |
+-----+------+-----+
|2    |Simon |41   |
+-----+------+-----+
|3    |Alice |20   |
+-----+------+-----+

repsert :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record backend) => Key record -> record -> ReaderT backend m () #

Put the record in the database with the given key. Unlike replace, if a record with the given key does not exist then a new record will be inserted.

Example usage

Expand

We try to explain upsertBy using schema-1 and dataset-1.

First, we insert Philip to dataset-1.

insertPhilip :: MonadIO m => ReaderT SqlBackend m (Key User)
insertPhilip = insert $ User "Philip" 42
philipId <- insertPhilip

This query will produce:

+-----+------+-----+
|id   |name  |age  |
+-----+------+-----+
|1    |SPJ   |40   |
+-----+------+-----+
|2    |Simon |41   |
+-----+------+-----+
|3    |Philip|42   |
+-----+------+-----+
repsertHaskell :: MonadIO m => Key record -> ReaderT SqlBackend m ()
repsertHaskell id = repsert id $ User "Haskell" 81
repsertHaskell philipId

This query will replace Philip's record with Haskell's one:

+-----+-----------------+--------+
|id   |name             |age     |
+-----+-----------------+--------+
|1    |SPJ              |40      |
+-----+-----------------+--------+
|2    |Simon            |41      |
+-----+-----------------+--------+
|3    |Philip -> Haskell|42 -> 81|
+-----+-----------------+--------+

repsert inserts the given record if the key doesn't exist.

repsertXToUnknown :: MonadIO m => ReaderT SqlBackend m ()
repsertXToUnknown = repsert unknownId $ User "X" 999

For example, applying the above query to dataset-1 will produce this:

+-----+------+-----+
|id   |name  |age  |
+-----+------+-----+
|1    |SPJ   |40   |
+-----+------+-----+
|2    |Simon |41   |
+-----+------+-----+
|3    |X     |999  |
+-----+------+-----+

repsertMany :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record backend) => [(Key record, record)] -> ReaderT backend m () #

Put many entities into the database.

Batch version of repsert for SQL backends.

Useful when migrating data from one entity to another and want to preserve ids.

Example usage

Expand

With schema-1 and dataset-1,

repsertManyUsers :: MonadIO m =>ReaderT SqlBackend m ()
repsertManyusers = repsertMany [(simonId, User "Philip" 20), (unknownId999, User "Mr. X" 999)]

The above query when applied on dataset-1, will produce this:

+-----+----------------+---------+
|id   |name            |age      |
+-----+----------------+---------+
|1    |SPJ             |40       |
+-----+----------------+---------+
|2    |Simon -> Philip |41 -> 20 |
+-----+----------------+---------+
|999  |Mr. X           |999      |
+-----+----------------+---------+

Since: persistent-2.8.1

replace :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record backend) => Key record -> record -> ReaderT backend m () #

Replace the record in the database with the given key. Note that the result is undefined if such record does not exist, so you must use insertKey or repsert in these cases.

Example usage

Expand

With schema-1 schama-1 and dataset-1,

replaceSpj :: MonadIO m => User -> ReaderT SqlBackend m ()
replaceSpj record = replace spjId record

The above query when applied on dataset-1, will produce this:

+-----+------+-----+
|id   |name  |age  |
+-----+------+-----+
|1    |Mike  |45   |
+-----+------+-----+
|2    |Simon |41   |
+-----+------+-----+

delete :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record backend) => Key record -> ReaderT backend m () #

Delete a specific record by identifier. Does nothing if record does not exist.

Example usage

Expand

With schema-1 and dataset-1,

deleteSpj :: MonadIO m => ReaderT SqlBackend m ()
deleteSpj = delete spjId

The above query when applied on dataset-1, will produce this:

+-----+------+-----+
|id   |name  |age  |
+-----+------+-----+
|2    |Simon |41   |
+-----+------+-----+

update :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record backend) => Key record -> [Update record] -> ReaderT backend m () #

Update individual fields on a specific record.

Example usage

Expand

With schema-1 and dataset-1,

updateSpj :: MonadIO m => [Update User] -> ReaderT SqlBackend m ()
updateSpj updates = update spjId updates
updateSpj [UserAge +=. 100]

The above query when applied on dataset-1, will produce this:

+-----+------+-----+
|id   |name  |age  |
+-----+------+-----+
|1    |SPJ   |140  |
+-----+------+-----+
|2    |Simon |41   |
+-----+------+-----+

updateGet :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record backend) => Key record -> [Update record] -> ReaderT backend m record #

Update individual fields on a specific record, and retrieve the updated value from the database.

Note that this function will throw an exception if the given key is not found in the database.

Example usage

Expand

With schema-1 and dataset-1,

updateGetSpj :: MonadIO m => [Update User] -> ReaderT SqlBackend m User
updateGetSpj updates = updateGet spjId updates
spj <- updateGetSpj [UserAge +=. 100]

The above query when applied on dataset-1, will produce this:

+-----+------+-----+
|id   |name  |age  |
+-----+------+-----+
|1    |SPJ   |140  |
+-----+------+-----+
|2    |Simon |41   |
+-----+------+-----+

Instances

Instances details
(HasPersistBackend b, PersistStoreWrite b) => PersistStoreWrite (RawPostgresql b) 
Instance details

Defined in Database.Persist.Postgresql

Methods

insert :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record (RawPostgresql b)) => record -> ReaderT (RawPostgresql b) m (Key record) #

insert_ :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record (RawPostgresql b)) => record -> ReaderT (RawPostgresql b) m () #

insertMany :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record (RawPostgresql b)) => [record] -> ReaderT (RawPostgresql b) m [Key record] #

insertMany_ :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record (RawPostgresql b)) => [record] -> ReaderT (RawPostgresql b) m () #

insertEntityMany :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record (RawPostgresql b)) => [Entity record] -> ReaderT (RawPostgresql b) m () #

insertKey :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record (RawPostgresql b)) => Key record -> record -> ReaderT (RawPostgresql b) m () #

repsert :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record (RawPostgresql b)) => Key record -> record -> ReaderT (RawPostgresql b) m () #

repsertMany :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record (RawPostgresql b)) => [(Key record, record)] -> ReaderT (RawPostgresql b) m () #

replace :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record (RawPostgresql b)) => Key record -> record -> ReaderT (RawPostgresql b) m () #

delete :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record (RawPostgresql b)) => Key record -> ReaderT (RawPostgresql b) m () #

update :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record (RawPostgresql b)) => Key record -> [Update record] -> ReaderT (RawPostgresql b) m () #

updateGet :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record (RawPostgresql b)) => Key record -> [Update record] -> ReaderT (RawPostgresql b) m record #

(HasPersistBackend b, BackendCompatible b s, PersistStoreWrite b) => PersistStoreWrite (Compatible b s) 
Instance details

Defined in Database.Persist.Compatible.Types

Methods

insert :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record (Compatible b s)) => record -> ReaderT (Compatible b s) m (Key record) #

insert_ :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record (Compatible b s)) => record -> ReaderT (Compatible b s) m () #

insertMany :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record (Compatible b s)) => [record] -> ReaderT (Compatible b s) m [Key record] #

insertMany_ :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record (Compatible b s)) => [record] -> ReaderT (Compatible b s) m () #

insertEntityMany :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record (Compatible b s)) => [Entity record] -> ReaderT (Compatible b s) m () #

insertKey :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record (Compatible b s)) => Key record -> record -> ReaderT (Compatible b s) m () #

repsert :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record (Compatible b s)) => Key record -> record -> ReaderT (Compatible b s) m () #

repsertMany :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record (Compatible b s)) => [(Key record, record)] -> ReaderT (Compatible b s) m () #

replace :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record (Compatible b s)) => Key record -> record -> ReaderT (Compatible b s) m () #

delete :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record (Compatible b s)) => Key record -> ReaderT (Compatible b s) m () #

update :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record (Compatible b s)) => Key record -> [Update record] -> ReaderT (Compatible b s) m () #

updateGet :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record (Compatible b s)) => Key record -> [Update record] -> ReaderT (Compatible b s) m record #

class (Show (BackendKey backend), Read (BackendKey backend), Eq (BackendKey backend), Ord (BackendKey backend), PersistCore backend, PersistField (BackendKey backend), ToJSON (BackendKey backend), FromJSON (BackendKey backend)) => PersistStoreRead backend where #

Minimal complete definition

get

Methods

get :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record backend) => Key record -> ReaderT backend m (Maybe record) #

Get a record by identifier, if available.

Example usage

Expand

With schema-1 and dataset-1,

getSpj :: MonadIO m => ReaderT SqlBackend m (Maybe User)
getSpj = get spjId
mspj <- getSpj

The above query when applied on dataset-1, will get this:

+------+-----+
| name | age |
+------+-----+
| SPJ  |  40 |
+------+-----+

getMany :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record backend) => [Key record] -> ReaderT backend m (Map (Key record) record) #

Get many records by their respective identifiers, if available.

Example usage

Expand

With schema-1 and dataset-1:

getUsers :: MonadIO m => ReaderT SqlBackend m (Map (Key User) User)
getUsers = getMany allkeys
musers <- getUsers

The above query when applied on dataset-1, will get these records:

+----+-------+-----+
| id | name  | age |
+----+-------+-----+
|  1 | SPJ   |  40 |
+----+-------+-----+
|  2 | Simon |  41 |
+----+-------+-----+

Since: persistent-2.8.1

Instances

Instances details
(HasPersistBackend b, PersistStoreRead b) => PersistStoreRead (RawPostgresql b) 
Instance details

Defined in Database.Persist.Postgresql

Methods

get :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record (RawPostgresql b)) => Key record -> ReaderT (RawPostgresql b) m (Maybe record) #

getMany :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record (RawPostgresql b)) => [Key record] -> ReaderT (RawPostgresql b) m (Map (Key record) record) #

(HasPersistBackend b, BackendCompatible b s, PersistStoreRead b) => PersistStoreRead (Compatible b s) 
Instance details

Defined in Database.Persist.Compatible.Types

Methods

get :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record (Compatible b s)) => Key record -> ReaderT (Compatible b s) m (Maybe record) #

getMany :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record (Compatible b s)) => [Key record] -> ReaderT (Compatible b s) m (Map (Key record) record) #

class PersistCore backend #

Associated Types

data BackendKey backend #

Instances

Instances details
PersistCore b => PersistCore (RawPostgresql b) 
Instance details

Defined in Database.Persist.Postgresql

Associated Types

data BackendKey (RawPostgresql b) #

(BackendCompatible b s, PersistCore b) => PersistCore (Compatible b s) 
Instance details

Defined in Database.Persist.Compatible.Types

Associated Types

data BackendKey (Compatible b s) #

data family BackendKey backend #

Instances

Instances details
Out (BackendKey SqlBackend) Source # 
Instance details

Defined in BtcLsp.Data.Orphan

(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

(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

(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

(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

(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

(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

(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

(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

(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

(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

(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

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

Defined in Database.Persist.Compatible.Types

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

Defined in Database.Persist.Postgresql

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

Defined in Database.Persist.Compatible.Types

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

Defined in Database.Persist.Postgresql

newtype BackendKey SqlReadBackend 
Instance details

Defined in Database.Persist.Sql.Orphan.PersistStore

newtype BackendKey SqlWriteBackend 
Instance details

Defined in Database.Persist.Sql.Orphan.PersistStore

newtype BackendKey SqlBackend 
Instance details

Defined in Database.Persist.Sql.Orphan.PersistStore

type Rep (BackendKey SqlReadBackend) 
Instance details

Defined in Database.Persist.Sql.Orphan.PersistStore

type Rep (BackendKey SqlReadBackend) = D1 ('MetaData "BackendKey" "Database.Persist.Sql.Orphan.PersistStore" "persistent-2.13.3.4-K7QWPYwATzA73w61MYpbGo" 'True) (C1 ('MetaCons "SqlReadBackendKey" 'PrefixI 'True) (S1 ('MetaSel ('Just "unSqlReadBackendKey") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int64)))
type Rep (BackendKey SqlWriteBackend) 
Instance details

Defined in Database.Persist.Sql.Orphan.PersistStore

type Rep (BackendKey SqlWriteBackend) = D1 ('MetaData "BackendKey" "Database.Persist.Sql.Orphan.PersistStore" "persistent-2.13.3.4-K7QWPYwATzA73w61MYpbGo" 'True) (C1 ('MetaCons "SqlWriteBackendKey" 'PrefixI 'True) (S1 ('MetaSel ('Just "unSqlWriteBackendKey") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int64)))
type Rep (BackendKey SqlBackend) 
Instance details

Defined in Database.Persist.Sql.Orphan.PersistStore

type Rep (BackendKey SqlBackend) = D1 ('MetaData "BackendKey" "Database.Persist.Sql.Orphan.PersistStore" "persistent-2.13.3.4-K7QWPYwATzA73w61MYpbGo" 'True) (C1 ('MetaCons "SqlBackendKey" 'PrefixI 'True) (S1 ('MetaSel ('Just "unSqlBackendKey") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int64)))
newtype BackendKey (RawPostgresql b) 
Instance details

Defined in Database.Persist.Postgresql

newtype BackendKey (Compatible b s) 
Instance details

Defined in Database.Persist.Compatible.Types

class (PersistEntity record, PersistEntityBackend record ~ backend, PersistCore backend) => ToBackendKey backend record where #

ToBackendKey converts a PersistEntity Key into a BackendKey This can be used by each backend to convert between a Key and a plain Haskell type. For Sql, that is done with toSqlKey and fromSqlKey.

By default, a PersistEntity uses the default BackendKey for its Key and is an instance of ToBackendKey

A Key that instead uses a custom type will not be an instance of ToBackendKey.

Methods

toBackendKey :: Key record -> BackendKey backend #

fromBackendKey :: BackendKey backend -> Key record #

type PersistRecordBackend record backend = (PersistEntity record, PersistEntityBackend record ~ BaseBackend backend) #

A convenient alias for common type signatures

class BackendCompatible sup sub where #

This class witnesses that two backend are compatible, and that you can convert from the sub backend into the sup backend. This is similar to the HasPersistBackend and IsPersistBackend classes, but where you don't want to fix the type associated with the PersistEntityBackend of a record.

Generally speaking, where you might have:

foo ::
  ( PersistEntity record
  , PeristEntityBackend record ~ BaseBackend backend
  , IsSqlBackend backend
  )

this can be replaced with:

foo ::
  ( PersistEntity record,
  , PersistEntityBackend record ~ backend
  , BackendCompatible SqlBackend backend
  )

This works for SqlReadBackend because of the instance BackendCompatible SqlBackend SqlReadBackend, without needing to go through the BaseBackend type family.

Likewise, functions that are currently hardcoded to use SqlBackend can be generalized:

-- before:
asdf :: ReaderT SqlBackend m ()
asdf = pure ()

-- after:
asdf' :: BackendCompatible SqlBackend backend => ReaderT backend m ()
asdf' = withCompatibleBackend asdf

Since: persistent-2.7.1

Methods

projectBackend :: sub -> sup #

Instances

Instances details
BackendCompatible b (RawPostgresql b) 
Instance details

Defined in Database.Persist.Postgresql

Methods

projectBackend :: RawPostgresql b -> b #

BackendCompatible (RawPostgresql b) (RawPostgresql b) 
Instance details

Defined in Database.Persist.Postgresql

class HasPersistBackend backend => IsPersistBackend backend #

Class which witnesses that backend is essentially the same as BaseBackend backend. That is, they're isomorphic and backend is just some wrapper over BaseBackend backend.

Minimal complete definition

mkPersistBackend

class HasPersistBackend backend where #

Class which allows the plucking of a BaseBackend backend from some larger type. For example, instance HasPersistBackend (SqlReadBackend, Int) where type BaseBackend (SqlReadBackend, Int) = SqlBackend persistBackend = unSqlReadBackend . fst

Associated Types

type BaseBackend backend #

Methods

persistBackend :: backend -> BaseBackend backend #

withBaseBackend :: forall backend (m :: Type -> Type) a. HasPersistBackend backend => ReaderT (BaseBackend backend) m a -> ReaderT backend m a #

Run a query against a larger backend by plucking out BaseBackend backend

This is a helper for reusing existing queries when expanding the backend type.

Since: persistent-2.12.0

withCompatibleBackend :: forall sup sub (m :: Type -> Type) a. BackendCompatible sup sub => ReaderT sup m a -> ReaderT sub m a #

Run a query against a compatible backend, by projecting the backend

This is a helper for using queries which run against a specific backend type that your backend is compatible with.

Since: persistent-2.12.0

liftPersist :: (MonadIO m, MonadReader backend m) => ReaderT backend IO b -> m b #

getJust :: forall record backend (m :: Type -> Type). (PersistStoreRead backend, PersistRecordBackend record backend, MonadIO m) => Key record -> ReaderT backend m record #

Same as get, but for a non-null (not Maybe) foreign key. Unsafe unless your database is enforcing that the foreign key is valid.

Example usage

Expand

With schema-1 and dataset-1,

getJustSpj :: MonadIO m => ReaderT SqlBackend m User
getJustSpj = getJust spjId
spj <- getJust spjId

The above query when applied on dataset-1, will get this record:

+----+------+-----+
| id | name | age |
+----+------+-----+
|  1 | SPJ  |  40 |
+----+------+-----+
getJustUnknown :: MonadIO m => ReaderT SqlBackend m User
getJustUnknown = getJust unknownId

mrx <- getJustUnknown

This just throws an error.

getJustEntity :: forall record backend (m :: Type -> Type). (PersistEntityBackend record ~ BaseBackend backend, MonadIO m, PersistEntity record, PersistStoreRead backend) => Key record -> ReaderT backend m (Entity record) #

Same as getJust, but returns an Entity instead of just the record.

Example usage

Expand

With schema-1 and dataset-1,

getJustEntitySpj :: MonadIO m => ReaderT SqlBackend m (Entity User)
getJustEntitySpj = getJustEntity spjId
spjEnt <- getJustEntitySpj

The above query when applied on dataset-1, will get this entity:

+----+------+-----+
| id | name | age |
+----+------+-----+
|  1 | SPJ  |  40 |
+----+------+-----+

Since: persistent-2.6.1

belongsTo :: forall ent1 ent2 backend (m :: Type -> Type). (PersistStoreRead backend, PersistEntity ent1, PersistRecordBackend ent2 backend, MonadIO m) => (ent1 -> Maybe (Key ent2)) -> ent1 -> ReaderT backend m (Maybe ent2) #

Curry this to make a convenience function that loads an associated model.

foreign = belongsTo foreignId

belongsToJust :: forall ent1 ent2 backend (m :: Type -> Type). (PersistStoreRead backend, PersistEntity ent1, PersistRecordBackend ent2 backend, MonadIO m) => (ent1 -> Key ent2) -> ent1 -> ReaderT backend m ent2 #

Same as belongsTo, but uses getJust and therefore is similarly unsafe.

insertEntity :: forall e backend (m :: Type -> Type). (PersistStoreWrite backend, PersistRecordBackend e backend, MonadIO m) => e -> ReaderT backend m (Entity e) #

Like insert, but returns the complete Entity.

Example usage

Expand

With schema-1 and dataset-1,

insertHaskellEntity :: MonadIO m => ReaderT SqlBackend m (Entity User)
insertHaskellEntity = insertEntity $ User "Haskell" 81
haskellEnt <- insertHaskellEntity

The above query when applied on dataset-1, will produce this:

+----+---------+-----+
| id |  name   | age |
+----+---------+-----+
|  1 | SPJ     |  40 |
+----+---------+-----+
|  2 | Simon   |  41 |
+----+---------+-----+
|  3 | Haskell |  81 |
+----+---------+-----+

getEntity :: forall e backend (m :: Type -> Type). (PersistStoreRead backend, PersistRecordBackend e backend, MonadIO m) => Key e -> ReaderT backend m (Maybe (Entity e)) #

Like get, but returns the complete Entity.

Example usage

Expand

With schema-1 and dataset-1,

getSpjEntity :: MonadIO m => ReaderT SqlBackend m (Maybe (Entity User))
getSpjEntity = getEntity spjId
mSpjEnt <- getSpjEntity

The above query when applied on dataset-1, will get this entity:

+----+------+-----+
| id | name | age |
+----+------+-----+
|  1 | SPJ  |  40 |
+----+------+-----+

insertRecord :: forall record backend (m :: Type -> Type). (PersistEntityBackend record ~ BaseBackend backend, PersistEntity record, MonadIO m, PersistStoreWrite backend) => record -> ReaderT backend m record #

Like insertEntity but just returns the record instead of Entity.

Example usage

Expand

With schema-1 and dataset-1,

insertDaveRecord :: MonadIO m => ReaderT SqlBackend m User
insertDaveRecord = insertRecord $ User "Dave" 50
dave <- insertDaveRecord

The above query when applied on dataset-1, will produce this:

+-----+------+-----+
|id   |name  |age  |
+-----+------+-----+
|1    |SPJ   |40   |
+-----+------+-----+
|2    |Simon |41   |
+-----+------+-----+
|3    |Dave  |50   |
+-----+------+-----+

Since: persistent-2.6.1

data SqlBackend #

A SqlBackend represents a handle or connection to a database. It contains functions and values that allow databases to have more optimized implementations, as well as references that benefit performance and sharing.

Instead of using the SqlBackend constructor directly, use the mkSqlBackend function.

A SqlBackend is *not* thread-safe. You should not assume that a SqlBackend can be shared among threads and run concurrent queries. This *will* result in problems. Instead, you should create a Pool SqlBackend, known as a ConnectionPool, and pass that around in multi-threaded applications.

To run actions in the persistent library, you should use the runSqlConn function. If you're using a multithreaded application, use the runSqlPool function.

Instances

Instances details
HasPersistBackend SqlBackend 
Instance details

Defined in Database.Persist.SqlBackend.Internal

Associated Types

type BaseBackend SqlBackend #

IsPersistBackend SqlBackend 
Instance details

Defined in Database.Persist.SqlBackend.Internal

ToBackendKey SqlBackend Block Source # 
Instance details

Defined in BtcLsp.Storage.Model

ToBackendKey SqlBackend LnChan Source # 
Instance details

Defined in BtcLsp.Storage.Model

ToBackendKey SqlBackend SwapIntoLn Source # 
Instance details

Defined in BtcLsp.Storage.Model

ToBackendKey SqlBackend SwapUtxo Source # 
Instance details

Defined in BtcLsp.Storage.Model

ToBackendKey SqlBackend User Source # 
Instance details

Defined in BtcLsp.Storage.Model

Out (BackendKey SqlBackend) Source # 
Instance details

Defined in BtcLsp.Data.Orphan

newtype BackendKey SqlBackend 
Instance details

Defined in Database.Persist.Sql.Orphan.PersistStore

type BaseBackend SqlBackend 
Instance details

Defined in Database.Persist.SqlBackend.Internal

type Rep (BackendKey SqlBackend) 
Instance details

Defined in Database.Persist.Sql.Orphan.PersistStore

type Rep (BackendKey SqlBackend) = D1 ('MetaData "BackendKey" "Database.Persist.Sql.Orphan.PersistStore" "persistent-2.13.3.4-K7QWPYwATzA73w61MYpbGo" 'True) (C1 ('MetaCons "SqlBackendKey" 'PrefixI 'True) (S1 ('MetaSel ('Just "unSqlBackendKey") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int64)))

class PersistEntity record => AtLeastOneUniqueKey record where #

This class is used to ensure that functions requring at least one unique key are not called with records that have 0 unique keys. The quasiquoter automatically writes working instances for appropriate entities, and generates TypeError instances for records that have 0 unique keys.

Since: persistent-2.10.0

Methods

requireUniquesP :: record -> NonEmpty (Unique record) #

type MultipleUniqueKeysError ty = ((('Text "The entity " :<>: 'ShowType ty) :<>: 'Text " has multiple unique keys.") :$$: ('Text "The function you are trying to call requires only a single " :<>: 'Text "unique key.")) :$$: (('Text "There is probably a variant of the function with 'By' " :<>: 'Text "appended that will allow you to select a unique key ") :<>: 'Text "for the operation.") #

This is an error message. It is used when an entity has multiple unique keys, and the function expects a single unique key.

Since: persistent-2.10.0

type NoUniqueKeysError ty = (('Text "The entity " :<>: 'ShowType ty) :<>: 'Text " does not have any unique keys.") :$$: ('Text "The function you are trying to call requires a unique key " :<>: 'Text "to be defined on the entity.") #

This is an error message. It is used when writing instances of OnlyOneUniqueKey for an entity that has no unique keys.

Since: persistent-2.10.0

class PersistEntity record => OnlyOneUniqueKey record where #

This class is used to ensure that upsert is only called on records that have a single Unique key. The quasiquoter automatically generates working instances for appropriate records, and generates TypeError instances for records that have 0 or multiple unique keys.

Since: persistent-2.10.0

Methods

onlyUniqueP :: record -> Unique record #

class (PersistUniqueRead backend, PersistStoreWrite backend) => PersistUniqueWrite backend where #

Some functions in this module (insertUnique, insertBy, and replaceUnique) first query the unique indexes to check for conflicts. You could instead optimistically attempt to perform the operation (e.g. replace instead of replaceUnique). However,

  • there is some fragility to trying to catch the correct exception and determing the column of failure;
  • an exception will automatically abort the current SQL transaction.

Minimal complete definition

deleteBy

Methods

deleteBy :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record backend) => Unique record -> ReaderT backend m () #

Delete a specific record by unique key. Does nothing if no record matches.

Example usage

Expand

With schema-1 and dataset-1,

deleteBySpjName :: MonadIO m => ReaderT SqlBackend m ()
deleteBySpjName = deleteBy UniqueUserName "SPJ"

The above query when applied on dataset-1, will produce this:

+-----+------+-----+
|id   |name  |age  |
+-----+------+-----+
|2    |Simon |41   |
+-----+------+-----+

insertUnique :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record backend) => record -> ReaderT backend m (Maybe (Key record)) #

Like insert, but returns Nothing when the record couldn't be inserted because of a uniqueness constraint.

Example usage

Expand

With schema-1 and dataset-1, we try to insert the following two records:

linusId <- insertUnique $ User "Linus" 48
spjId   <- insertUnique $ User "SPJ" 90
+-----+------+-----+
|id   |name  |age  |
+-----+------+-----+
|1    |SPJ   |40   |
+-----+------+-----+
|2    |Simon |41   |
+-----+------+-----+
|3    |Linus |48   |
+-----+------+-----+

Linus's record was inserted to dataset-1, while SPJ wasn't because SPJ already exists in dataset-1.

upsert #

Arguments

:: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record backend, OnlyOneUniqueKey record) 
=> record

new record to insert

-> [Update record]

updates to perform if the record already exists

-> ReaderT backend m (Entity record)

the record in the database after the operation

Update based on a uniqueness constraint or insert:

  • insert the new record if it does not exist;
  • If the record exists (matched via it's uniqueness constraint), then update the existing record with the parameters which is passed on as list to the function.

Example usage

Expand

First, we try to explain upsert using schema-1 and dataset-1.

upsertSpj :: MonadIO m => [Update User] -> ReaderT SqlBackend m (Maybe (Entity User))
upsertSpj updates = upsert (User "SPJ" 999) upadtes
mSpjEnt <- upsertSpj [UserAge +=. 15]

The above query when applied on dataset-1, will produce this:

+-----+-----+--------+
|id   |name |age     |
+-----+-----+--------+
|1    |SPJ  |40 -> 55|
+-----+-----+--------+
|2    |Simon|41      |
+-----+-----+--------+
upsertX :: MonadIO m => [Update User] -> ReaderT SqlBackend m (Maybe (Entity User))
upsertX updates = upsert (User "X" 999) updates
mXEnt <- upsertX [UserAge +=. 15]

The above query when applied on dataset-1, will produce this:

+-----+-----+--------+
|id   |name |age     |
+-----+-----+--------+
|1    |SPJ  |40      |
+-----+-----+--------+
|2    |Simon|41      |
+-----+-----+--------+
|3    |X    |999     |
+-----+-----+--------+

Next, what if the schema has two uniqueness constraints? Let's check it out using schema-2:

mSpjEnt <- upsertSpj [UserAge +=. 15]

This fails with a compile-time type error alerting us to the fact that this record has multiple unique keys, and suggests that we look for upsertBy to select the unique key we want.

upsertBy #

Arguments

:: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record backend) 
=> Unique record

uniqueness constraint to find by

-> record

new record to insert

-> [Update record]

updates to perform if the record already exists

-> ReaderT backend m (Entity record)

the record in the database after the operation

Update based on a given uniqueness constraint or insert:

  • insert the new record if it does not exist;
  • update the existing record that matches the given uniqueness constraint.

Example usage

Expand

We try to explain upsertBy using schema-2 and dataset-1.

upsertBySpjName :: MonadIO m => User -> [Update User] -> ReaderT SqlBackend m (Entity User)
upsertBySpjName record updates = upsertBy (UniqueUserName "SPJ") record updates
mSpjEnt <- upsertBySpjName (Person "X" 999) [PersonAge += .15]

The above query will alter dataset-1 to:

+-----+-----+--------+
|id   |name |age     |
+-----+-----+--------+
|1    |SPJ  |40 -> 55|
+-----+-----+--------+
|2    |Simon|41      |
+-----+-----+--------+
upsertBySimonAge :: MonadIO m => User -> [Update User] -> ReaderT SqlBackend m (Entity User)
upsertBySimonAge record updates = upsertBy (UniqueUserName "SPJ") record updates
mPhilipEnt <- upsertBySimonAge (User "X" 999) [UserName =. "Philip"]

The above query will alter dataset-1 to:

+----+-----------------+-----+
| id |      name       | age |
+----+-----------------+-----+
|  1 | SPJ             |  40 |
+----+-----------------+-----+
|  2 | Simon -> Philip |  41 |
+----+-----------------+-----+
upsertByUnknownName :: MonadIO m => User -> [Update User] -> ReaderT SqlBackend m (Entity User)
upsertByUnknownName record updates = upsertBy (UniqueUserName "Unknown") record updates
mXEnt <- upsertByUnknownName (User "X" 999) [UserAge +=. 15]

This query will alter dataset-1 to:

+-----+-----+-----+
|id   |name |age  |
+-----+-----+-----+
|1    |SPJ  |40   |
+-----+-----+-----+
|2    |Simon|41   |
+-----+-----+-----+
|3    |X    |999  |
+-----+-----+-----+

putMany #

Arguments

:: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record backend) 
=> [record]

A list of the records you want to insert or replace.

-> ReaderT backend m () 

Put many records into db

  • insert new records that do not exist (or violate any unique constraints)
  • replace existing records (matching any unique constraint)

Since: persistent-2.8.1

Instances

Instances details
(HasPersistBackend b, PersistUniqueWrite b) => PersistUniqueWrite (RawPostgresql b) 
Instance details

Defined in Database.Persist.Postgresql

Methods

deleteBy :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record (RawPostgresql b)) => Unique record -> ReaderT (RawPostgresql b) m () #

insertUnique :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record (RawPostgresql b)) => record -> ReaderT (RawPostgresql b) m (Maybe (Key record)) #

upsert :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record (RawPostgresql b), OnlyOneUniqueKey record) => record -> [Update record] -> ReaderT (RawPostgresql b) m (Entity record) #

upsertBy :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record (RawPostgresql b)) => Unique record -> record -> [Update record] -> ReaderT (RawPostgresql b) m (Entity record) #

putMany :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record (RawPostgresql b)) => [record] -> ReaderT (RawPostgresql b) m () #

(HasPersistBackend b, BackendCompatible b s, PersistUniqueWrite b) => PersistUniqueWrite (Compatible b s) 
Instance details

Defined in Database.Persist.Compatible.Types

Methods

deleteBy :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record (Compatible b s)) => Unique record -> ReaderT (Compatible b s) m () #

insertUnique :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record (Compatible b s)) => record -> ReaderT (Compatible b s) m (Maybe (Key record)) #

upsert :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record (Compatible b s), OnlyOneUniqueKey record) => record -> [Update record] -> ReaderT (Compatible b s) m (Entity record) #

upsertBy :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record (Compatible b s)) => Unique record -> record -> [Update record] -> ReaderT (Compatible b s) m (Entity record) #

putMany :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record (Compatible b s)) => [record] -> ReaderT (Compatible b s) m () #

class PersistStoreRead backend => PersistUniqueRead backend where #

Queries against Unique keys (other than the id Key).

Please read the general Persistent documentation to learn how to create Unique keys.

Using this with an Entity without a Unique key leads to undefined behavior. A few of these functions require a single Unique, so using an Entity with multiple Uniques is also undefined. In these cases persistent's goal is to throw an exception as soon as possible, but persistent is still transitioning to that.

SQL backends automatically create uniqueness constraints, but for MongoDB you must manually place a unique index on a field to have a uniqueness constraint.

Methods

getBy :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record backend) => Unique record -> ReaderT backend m (Maybe (Entity record)) #

Get a record by unique key, if available. Returns also the identifier.

Example usage

Expand

With schema-1 and dataset-1:

getBySpjName :: MonadIO m  => ReaderT SqlBackend m (Maybe (Entity User))
getBySpjName = getBy $ UniqueUserName "SPJ"
mSpjEnt <- getBySpjName

The above query when applied on dataset-1, will get this entity:

+----+------+-----+
| id | name | age |
+----+------+-----+
|  1 | SPJ  |  40 |
+----+------+-----+

Instances

Instances details
(HasPersistBackend b, PersistUniqueRead b) => PersistUniqueRead (RawPostgresql b) 
Instance details

Defined in Database.Persist.Postgresql

Methods

getBy :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record (RawPostgresql b)) => Unique record -> ReaderT (RawPostgresql b) m (Maybe (Entity record)) #

(HasPersistBackend b, BackendCompatible b s, PersistUniqueRead b) => PersistUniqueRead (Compatible b s) 
Instance details

Defined in Database.Persist.Compatible.Types

Methods

getBy :: forall record (m :: Type -> Type). (MonadIO m, PersistRecordBackend record (Compatible b s)) => Unique record -> ReaderT (Compatible b s) m (Maybe (Entity record)) #

onlyOneUniqueDef :: (OnlyOneUniqueKey record, Monad proxy) => proxy record -> UniqueDef #

Given a proxy for a PersistEntity record, this returns the sole UniqueDef for that entity.

Since: persistent-2.13.0.0

insertBy :: forall record backend (m :: Type -> Type). (MonadIO m, PersistUniqueWrite backend, PersistRecordBackend record backend, AtLeastOneUniqueKey record) => record -> ReaderT backend m (Either (Entity record) (Key record)) #

Insert a value, checking for conflicts with any unique constraints. If a duplicate exists in the database, it is returned as Left. Otherwise, the new 'Key is returned as Right.

Example usage

Expand

With schema-2 and dataset-1, we have following lines of code:

l1 <- insertBy $ User "SPJ" 20
l2 <- insertBy $ User "XXX" 41
l3 <- insertBy $ User "SPJ" 40
r1 <- insertBy $ User "XXX" 100

First three lines return Left because there're duplicates in given record's uniqueness constraints. While the last line returns a new key as Right.

insertUniqueEntity :: forall record backend (m :: Type -> Type). (MonadIO m, PersistRecordBackend record backend, PersistUniqueWrite backend) => record -> ReaderT backend m (Maybe (Entity record)) #

Like insertEntity, but returns Nothing when the record couldn't be inserted because of a uniqueness constraint.

Example usage

Expand

We use schema-2 and dataset-1 here.

insertUniqueSpjEntity :: MonadIO m => ReaderT SqlBackend m (Maybe (Entity User))
insertUniqueSpjEntity = insertUniqueEntity $ User "SPJ" 50
mSpjEnt <- insertUniqueSpjEntity

The above query results Nothing as SPJ already exists.

insertUniqueAlexaEntity :: MonadIO m => ReaderT SqlBackend m (Maybe (Entity User))
insertUniqueAlexaEntity = insertUniqueEntity $ User "Alexa" 3
mAlexaEnt <- insertUniqueSpjEntity

Because there's no such unique keywords of the given record, the above query when applied on dataset-1, will produce this:

+----+-------+-----+
| id | name  | age |
+----+-------+-----+
|  1 | SPJ   |  40 |
+----+-------+-----+
|  2 | Simon |  41 |
+----+-------+-----+
|  3 | Alexa |   3 |
+----+-------+-----+

Since: persistent-2.7.1

onlyUnique :: forall record backend (m :: Type -> Type). (MonadIO m, PersistUniqueWrite backend, PersistRecordBackend record backend, OnlyOneUniqueKey record) => record -> ReaderT backend m (Unique record) #

Return the single unique key for a record.

Example usage

Expand

We use shcema-1 and dataset-1 here.

onlySimonConst :: MonadIO m => ReaderT SqlBackend m (Unique User)
onlySimonConst = onlyUnique $ User "Simon" 999
mSimonConst <- onlySimonConst

mSimonConst would be Simon's uniqueness constraint. Note that onlyUnique doesn't work if there're more than two constraints. It will fail with a type error instead.

getByValue :: forall record (m :: Type -> Type) backend. (MonadIO m, PersistUniqueRead backend, PersistRecordBackend record backend, AtLeastOneUniqueKey record) => record -> ReaderT backend m (Maybe (Entity record)) #

A modification of getBy, which takes the PersistEntity itself instead of a Unique record. Returns a record matching one of the unique keys. This function makes the most sense on entities with a single Unique constructor.

Example usage

Expand

With schema-1 and dataset-1,

getBySpjValue :: MonadIO m => ReaderT SqlBackend m (Maybe (Entity User)) getBySpjValue = getByValue $ User SPJ 999

mSpjEnt <- getBySpjValue

The above query when applied on dataset-1, will get this record:

+----+------+-----+
| id | name | age |
+----+------+-----+
|  1 | SPJ  |  40 |
+----+------+-----+

replaceUnique :: forall record backend (m :: Type -> Type). (MonadIO m, Eq (Unique record), PersistRecordBackend record backend, PersistUniqueWrite backend) => Key record -> record -> ReaderT backend m (Maybe (Unique record)) #

Attempt to replace the record of the given key with the given new record. First query the unique fields to make sure the replacement maintains uniqueness constraints.

Return Nothing if the replacement was made. If uniqueness is violated, return a Just with the Unique violation

Since: persistent-1.2.2.0

checkUnique :: forall record backend (m :: Type -> Type). (MonadIO m, PersistRecordBackend record backend, PersistUniqueRead backend) => record -> ReaderT backend m (Maybe (Unique record)) #

Check whether there are any conflicts for unique keys with this entity and existing entities in the database.

Returns Nothing if the entity would be unique, and could thus safely be inserted. on a conflict returns the conflicting key

Example usage

Expand

We use schema-1 and dataset-1 here.

This would be Nothing:

mAlanConst <- checkUnique $ User "Alan" 70

While this would be Just because SPJ already exists:

mSpjConst <- checkUnique $ User "SPJ" 60

checkUniqueUpdateable :: forall record backend (m :: Type -> Type). (MonadIO m, PersistRecordBackend record backend, PersistUniqueRead backend) => Entity record -> ReaderT backend m (Maybe (Unique record)) #

Check whether there are any conflicts for unique keys with this entity and existing entities in the database.

Returns Nothing if the entity would stay unique, and could thus safely be updated. on a conflict returns the conflicting key

This is similar to checkUnique, except it's useful for updating - when the particular entity already exists, it would normally conflict with itself. This variant ignores those conflicts

Example usage

Expand

We use schema-1 and dataset-1 here.

This would be Nothing:

mAlanConst <- checkUnique $ User "Alan" 70

While this would be Just because SPJ already exists:

mSpjConst <- checkUnique $ User "SPJ" 60

Since: persistent-2.11.0.0

class (PersistQueryRead backend, PersistStoreWrite backend) => PersistQueryWrite backend where #

Backends supporting conditional write operations

Methods

updateWhere :: forall (m :: Type -> Type) record. (MonadIO m, PersistRecordBackend record backend) => [Filter record] -> [Update record] -> ReaderT backend m () #

Update individual fields on any record matching the given criterion.

deleteWhere :: forall (m :: Type -> Type) record. (MonadIO m, PersistRecordBackend record backend) => [Filter record] -> ReaderT backend m () #

Delete all records matching the given criterion.

Instances

Instances details
(HasPersistBackend b, PersistQueryWrite b) => PersistQueryWrite (RawPostgresql b) 
Instance details

Defined in Database.Persist.Postgresql

Methods

updateWhere :: forall (m :: Type -> Type) record. (MonadIO m, PersistRecordBackend record (RawPostgresql b)) => [Filter record] -> [Update record] -> ReaderT (RawPostgresql b) m () #

deleteWhere :: forall (m :: Type -> Type) record. (MonadIO m, PersistRecordBackend record (RawPostgresql b)) => [Filter record] -> ReaderT (RawPostgresql b) m () #

(HasPersistBackend b, BackendCompatible b s, PersistQueryWrite b) => PersistQueryWrite (Compatible b s) 
Instance details

Defined in Database.Persist.Compatible.Types

Methods

updateWhere :: forall (m :: Type -> Type) record. (MonadIO m, PersistRecordBackend record (Compatible b s)) => [Filter record] -> [Update record] -> ReaderT (Compatible b s) m () #

deleteWhere :: forall (m :: Type -> Type) record. (MonadIO m, PersistRecordBackend record (Compatible b s)) => [Filter record] -> ReaderT (Compatible b s) m () #

class (PersistCore backend, PersistStoreRead backend) => PersistQueryRead backend where #

Backends supporting conditional read operations.

Minimal complete definition

selectSourceRes, selectKeysRes, count, exists

Methods

selectSourceRes :: forall record (m1 :: Type -> Type) (m2 :: Type -> Type). (PersistRecordBackend record backend, MonadIO m1, MonadIO m2) => [Filter record] -> [SelectOpt record] -> ReaderT backend m1 (Acquire (ConduitM () (Entity record) m2 ())) #

Get all records matching the given criterion in the specified order. Returns also the identifiers.

NOTE: This function returns an Acquire and a ConduitM, which implies that it streams from the database. It does not. Please use selectList to simplify the code. If you want streaming behavior, consider persistent-pagination which efficiently chunks a query into ranges, or investigate a backend-specific streaming solution.

selectFirst :: forall (m :: Type -> Type) record. (MonadIO m, PersistRecordBackend record backend) => [Filter record] -> [SelectOpt record] -> ReaderT backend m (Maybe (Entity record)) #

Get just the first record for the criterion.

selectKeysRes :: forall (m1 :: Type -> Type) (m2 :: Type -> Type) record. (MonadIO m1, MonadIO m2, PersistRecordBackend record backend) => [Filter record] -> [SelectOpt record] -> ReaderT backend m1 (Acquire (ConduitM () (Key record) m2 ())) #

Get the Keys of all records matching the given criterion.

count :: forall (m :: Type -> Type) record. (MonadIO m, PersistRecordBackend record backend) => [Filter record] -> ReaderT backend m Int #

The total number of records fulfilling the given criterion.

exists :: forall (m :: Type -> Type) record. (MonadIO m, PersistRecordBackend record backend) => [Filter record] -> ReaderT backend m Bool #

Check if there is at least one record fulfilling the given criterion.

Since: persistent-2.11

Instances

Instances details
(HasPersistBackend b, PersistQueryRead b) => PersistQueryRead (RawPostgresql b) 
Instance details

Defined in Database.Persist.Postgresql

Methods

selectSourceRes :: forall record (m1 :: Type -> Type) (m2 :: Type -> Type). (PersistRecordBackend record (RawPostgresql b), MonadIO m1, MonadIO m2) => [Filter record] -> [SelectOpt record] -> ReaderT (RawPostgresql b) m1 (Acquire (ConduitM () (Entity record) m2 ())) #

selectFirst :: forall (m :: Type -> Type) record. (MonadIO m, PersistRecordBackend record (RawPostgresql b)) => [Filter record] -> [SelectOpt record] -> ReaderT (RawPostgresql b) m (Maybe (Entity record)) #

selectKeysRes :: forall (m1 :: Type -> Type) (m2 :: Type -> Type) record. (MonadIO m1, MonadIO m2, PersistRecordBackend record (RawPostgresql b)) => [Filter record] -> [SelectOpt record] -> ReaderT (RawPostgresql b) m1 (Acquire (ConduitM () (Key record) m2 ())) #

count :: forall (m :: Type -> Type) record. (MonadIO m, PersistRecordBackend record (RawPostgresql b)) => [Filter record] -> ReaderT (RawPostgresql b) m Int #

exists :: forall (m :: Type -> Type) record. (MonadIO m, PersistRecordBackend record (RawPostgresql b)) => [Filter record] -> ReaderT (RawPostgresql b) m Bool #

(HasPersistBackend b, BackendCompatible b s, PersistQueryRead b) => PersistQueryRead (Compatible b s) 
Instance details

Defined in Database.Persist.Compatible.Types

Methods

selectSourceRes :: forall record (m1 :: Type -> Type) (m2 :: Type -> Type). (PersistRecordBackend record (Compatible b s), MonadIO m1, MonadIO m2) => [Filter record] -> [SelectOpt record] -> ReaderT (Compatible b s) m1 (Acquire (ConduitM () (Entity record) m2 ())) #

selectFirst :: forall (m :: Type -> Type) record. (MonadIO m, PersistRecordBackend record (Compatible b s)) => [Filter record] -> [SelectOpt record] -> ReaderT (Compatible b s) m (Maybe (Entity record)) #

selectKeysRes :: forall (m1 :: Type -> Type) (m2 :: Type -> Type) record. (MonadIO m1, MonadIO m2, PersistRecordBackend record (Compatible b s)) => [Filter record] -> [SelectOpt record] -> ReaderT (Compatible b s) m1 (Acquire (ConduitM () (Key record) m2 ())) #

count :: forall (m :: Type -> Type) record. (MonadIO m, PersistRecordBackend record (Compatible b s)) => [Filter record] -> ReaderT (Compatible b s) m Int #

exists :: forall (m :: Type -> Type) record. (MonadIO m, PersistRecordBackend record (Compatible b s)) => [Filter record] -> ReaderT (Compatible b s) m Bool #

selectSource :: forall record backend (m :: Type -> Type). (PersistQueryRead backend, MonadResource m, PersistRecordBackend record backend, MonadReader backend m) => [Filter record] -> [SelectOpt record] -> ConduitM () (Entity record) m () #

Get all records matching the given criterion in the specified order. Returns also the identifiers.

WARNING: This function returns a ConduitM, which implies that it streams the results. It does not stream results on most backends. If you need streaming, see persistent-pagination for a means of chunking results based on indexed ranges.

selectKeys :: forall record backend (m :: Type -> Type). (PersistQueryRead backend, MonadResource m, PersistRecordBackend record backend, MonadReader backend m) => [Filter record] -> [SelectOpt record] -> ConduitM () (Key record) m () #

Get the Keys of all records matching the given criterion.

For an example, see selectList.

selectList :: forall record backend (m :: Type -> Type). (MonadIO m, PersistQueryRead backend, PersistRecordBackend record backend) => [Filter record] -> [SelectOpt record] -> ReaderT backend m [Entity record] #

Returns a [Entity record] corresponding to the filters and options provided.

Filters are constructed using the operators defined in Database.Persist (and re-exported from Database.Persist.Sql). Let's look at some examples:

usersWithAgeOver40 :: SqlPersistT IO [Entity User]
usersWithAgeOver40 =
    selectList [UserAge >=. 40] []

If you provide multiple values in the list, the conditions are ANDed together.

usersWithAgeBetween30And50 :: SqlPersistT IO [Entity User]
usersWithAgeBetween30And50 =
     selectList
         [ UserAge >=. 30
         , UserAge <=. 50
         ]
         []

The second list contains the SelectOpt for a record. We can select the first ten records with LimitTo

firstTenUsers =
    selectList [] [LimitTo 10]

And we can select the second ten users with OffsetBy.

secondTenUsers =
    selectList [] [LimitTo 10, OffsetBy 10]

Warning that LIMIT/OFFSET is bad for pagination!

With Asc and Desc, we can provide the field we want to sort on. We can provide multiple sort orders - later ones are used to sort records that are equal on the first field.

newestUsers =
    selectList [] [Desc UserCreatedAt, LimitTo 10]

oldestUsers =
    selectList [] [Asc UserCreatedAt, LimitTo 10]

selectKeysList :: forall record backend (m :: Type -> Type). (MonadIO m, PersistQueryRead backend, PersistRecordBackend record backend) => [Filter record] -> [SelectOpt record] -> ReaderT backend m [Key record] #

Call selectKeys but return the result as a list.

class (PersistStoreWrite backend, PersistEntity record, BaseBackend backend ~ PersistEntityBackend record) => DeleteCascade record backend where #

For combinations of backends and entities that support cascade-deletion. “Cascade-deletion” means that entries that depend on other entries to be deleted will be deleted as well.

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key record -> ReaderT backend m () #

Perform cascade-deletion of single database entry.

deleteCascadeWhere :: forall record backend (m :: Type -> Type). (MonadIO m, DeleteCascade record backend, PersistQueryWrite backend) => [Filter record] -> ReaderT backend m () #

Cascade-deletion of entries satisfying given filters.

type PersistStore a = PersistStoreWrite a #

A backwards-compatible alias for those that don't care about distinguishing between read and write queries. It signifies the assumption that, by default, a backend can write as well as read.

type PersistQuery a = PersistQueryWrite a #

A backwards-compatible alias for those that don't care about distinguishing between read and write queries. It signifies the assumption that, by default, a backend can write as well as read.

type PersistUnique a = PersistUniqueWrite a #

A backwards-compatible alias for those that don't care about distinguishing between read and write queries. It signifies the assumption that, by default, a backend can write as well as read.

(=.) :: forall v typ. PersistField typ => EntityField v typ -> typ -> Update v infixr 3 #

Assign a field a value.

Examples

updateAge :: MonadIO m => ReaderT SqlBackend m ()
updateAge = updateWhere [UserName ==. "SPJ" ] [UserAge =. 45]

Similar to updateWhere which is shown in the above example you can use other functions present in the module Database.Persist.Class. Note that the first parameter of updateWhere is [Filter val] and second parameter is [Update val]. By comparing this with the type of ==. and =., you can see that they match up in the above usage.

The above query when applied on dataset-1, will produce this:

+-----+-----+--------+
|id   |name |age     |
+-----+-----+--------+
|1    |SPJ  |40 -> 45|
+-----+-----+--------+
|2    |Simon|41      |
+-----+-----+--------+

(+=.) :: forall v typ. PersistField typ => EntityField v typ -> typ -> Update v infixr 3 #

Assign a field by addition (+=).

Examples

addAge :: MonadIO m => ReaderT SqlBackend m ()
addAge = updateWhere [UserName ==. "SPJ" ] [UserAge +=. 1]

The above query when applied on dataset-1, will produce this:

+-----+-----+---------+
|id   |name |age      |
+-----+-----+---------+
|1    |SPJ  |40 -> 41 |
+-----+-----+---------+
|2    |Simon|41       |
+-----+-----+---------+

(-=.) :: forall v typ. PersistField typ => EntityField v typ -> typ -> Update v infixr 3 #

Assign a field by subtraction (-=).

Examples

subtractAge :: MonadIO m => ReaderT SqlBackend m ()
subtractAge = updateWhere [UserName ==. "SPJ" ] [UserAge -=. 1]

The above query when applied on dataset-1, will produce this:

+-----+-----+---------+
|id   |name |age      |
+-----+-----+---------+
|1    |SPJ  |40 -> 39 |
+-----+-----+---------+
|2    |Simon|41       |
+-----+-----+---------+

(*=.) :: forall v typ. PersistField typ => EntityField v typ -> typ -> Update v infixr 3 #

Assign a field by multiplication (*=).

Examples

multiplyAge :: MonadIO m => ReaderT SqlBackend m ()
multiplyAge = updateWhere [UserName ==. "SPJ" ] [UserAge *=. 2]

The above query when applied on dataset-1, will produce this:

+-----+-----+--------+
|id   |name |age     |
+-----+-----+--------+
|1    |SPJ  |40 -> 80|
+-----+-----+--------+
|2    |Simon|41      |
+-----+-----+--------+

(/=.) :: forall v typ. PersistField typ => EntityField v typ -> typ -> Update v infixr 3 #

Assign a field by division (/=).

Examples

divideAge :: MonadIO m => ReaderT SqlBackend m ()
divideAge = updateWhere [UserName ==. "SPJ" ] [UserAge /=. 2]

The above query when applied on dataset-1, will produce this:

+-----+-----+---------+
|id   |name |age      |
+-----+-----+---------+
|1    |SPJ  |40 -> 20 |
+-----+-----+---------+
|2    |Simon|41       |
+-----+-----+---------+

(==.) :: forall v typ. PersistField typ => EntityField v typ -> typ -> Filter v infix 4 #

Check for equality.

Examples

selectSPJ :: MonadIO m => ReaderT SqlBackend m [Entity User]
selectSPJ = selectList [UserName ==. "SPJ" ] []

The above query when applied on dataset-1, will produce this:

+-----+-----+-----+
|id   |name |age  |
+-----+-----+-----+
|1    |SPJ  |40   |
+-----+-----+-----+

(!=.) :: forall v typ. PersistField typ => EntityField v typ -> typ -> Filter v infix 4 #

Non-equality check.

Examples

selectSimon :: MonadIO m => ReaderT SqlBackend m [Entity User]
selectSimon = selectList [UserName !=. "SPJ" ] []

The above query when applied on dataset-1, will produce this:

+-----+-----+-----+
|id   |name |age  |
+-----+-----+-----+
|2    |Simon|41   |
+-----+-----+-----+

(<.) :: forall v typ. PersistField typ => EntityField v typ -> typ -> Filter v infix 4 #

Less-than check.

Examples

selectLessAge :: MonadIO m => ReaderT SqlBackend m [Entity User]
selectLessAge = selectList [UserAge <. 41 ] []

The above query when applied on dataset-1, will produce this:

+-----+-----+-----+
|id   |name |age  |
+-----+-----+-----+
|1    |SPJ  |40   |
+-----+-----+-----+

(<=.) :: forall v typ. PersistField typ => EntityField v typ -> typ -> Filter v infix 4 #

Less-than or equal check.

Examples

selectLessEqualAge :: MonadIO m => ReaderT SqlBackend m [Entity User]
selectLessEqualAge = selectList [UserAge <=. 40 ] []

The above query when applied on dataset-1, will produce this:

+-----+-----+-----+
|id   |name |age  |
+-----+-----+-----+
|1    |SPJ  |40   |
+-----+-----+-----+

(>.) :: forall v typ. PersistField typ => EntityField v typ -> typ -> Filter v infix 4 #

Greater-than check.

Examples

selectGreaterAge :: MonadIO m => ReaderT SqlBackend m [Entity User]
selectGreaterAge = selectList [UserAge >. 40 ] []

The above query when applied on dataset-1, will produce this:

+-----+-----+-----+
|id   |name |age  |
+-----+-----+-----+
|2    |Simon|41   |
+-----+-----+-----+

(>=.) :: forall v typ. PersistField typ => EntityField v typ -> typ -> Filter v infix 4 #

Greater-than or equal check.

Examples

selectGreaterEqualAge :: MonadIO m => ReaderT SqlBackend m [Entity User]
selectGreaterEqualAge = selectList [UserAge >=. 41 ] []

The above query when applied on dataset-1, will produce this:

+-----+-----+-----+
|id   |name |age  |
+-----+-----+-----+
|2    |Simon|41   |
+-----+-----+-----+

(<-.) :: forall v typ. PersistField typ => EntityField v typ -> [typ] -> Filter v infix 4 #

Check if value is in given list.

Examples

selectUsers :: MonadIO m => ReaderT SqlBackend m [Entity User]
selectUsers = selectList [UserAge <-. [40, 41]] []

The above query when applied on dataset-1, will produce this:

+-----+-----+-----+
|id   |name |age  |
+-----+-----+-----+
|1    |SPJ  |40   |
+-----+-----+-----+
|2    |Simon|41   |
+-----+-----+-----+
selectSPJ :: MonadIO m => ReaderT SqlBackend m [Entity User]
selectSPJ = selectList [UserAge <-. [40]] []

The above query when applied on dataset-1, will produce this:

+-----+-----+-----+
|id   |name |age  |
+-----+-----+-----+
|1    |SPJ  |40   |
+-----+-----+-----+

(/<-.) :: forall v typ. PersistField typ => EntityField v typ -> [typ] -> Filter v infix 4 #

Check if value is not in given list.

Examples

selectSimon :: MonadIO m => ReaderT SqlBackend m [Entity User]
selectSimon = selectList [UserAge /<-. [40]] []

The above query when applied on dataset-1, will produce this:

+-----+-----+-----+
|id   |name |age  |
+-----+-----+-----+
|2    |Simon|41   |
+-----+-----+-----+

(||.) :: [Filter v] -> [Filter v] -> [Filter v] infixl 3 #

The OR of two lists of filters. For example:

selectList
    ([ PersonAge >. 25
     , PersonAge <. 30 ] ||.
     [ PersonIncome >. 15000
     , PersonIncome <. 25000 ])
    []

will filter records where a person's age is between 25 and 30 or a person's income is between (15000 and 25000).

If you are looking for an (&&.) operator to do (A AND B AND (C OR D)) you can use the (++) operator instead as there is no (&&.). For example:

selectList
    ([ PersonAge >. 25
     , PersonAge <. 30 ] ++
    ([PersonCategory ==. 1] ||.
     [PersonCategory ==. 5]))
    []

will filter records where a person's age is between 25 and 30 and (person's category is either 1 or 5).

listToJSON :: [PersistValue] -> Text #

Convert list of PersistValues into textual representation of JSON object. This is a type-constrained synonym for toJsonText.

mapToJSON :: [(Text, PersistValue)] -> Text #

Convert map (list of tuples) into textual representation of JSON object. This is a type-constrained synonym for toJsonText.

toJsonText :: ToJSON j => j -> Text #

A more general way to convert instances of ToJSON type class to strict text Text.

limitOffsetOrder :: PersistEntity val => [SelectOpt val] -> (Int, Int, [SelectOpt val]) #

FIXME What's this exactly?

runMigration :: forall (m :: Type -> Type). MonadIO m => Migration -> ReaderT SqlBackend m () #

Runs a migration. If the migration fails to parse or if any of the migrations are unsafe, then this throws a PersistUnsafeMigrationException.

data ImplicitIdDef #

A specification for how the implied ID columns are created.

By default, persistent will give each table a default column named id (customizable by PersistSettings), and the column type will be whatever you'd expect from BackendKey yourBackendType. For The SqlBackend type, this is an auto incrementing integer primary key.

You might want to give a different example. A common use case in postgresql is to use the UUID type, and automatically generate them using a SQL function.

Previously, you'd need to add a custom Id annotation for each model.

User
    Id   UUID default="uuid_generate_v1mc()"
    name Text

Dog
    Id   UUID default="uuid_generate_v1mc()"
    name Text
    user UserId

Now, you can simply create an ImplicitIdDef that corresponds to this declaration.

newtype UUID = UUID ByteString

instance PersistField UUID where
    toPersistValue (UUID bs) =
        PersistLiteral_ Escaped bs
    fromPersistValue pv =
        case pv of
            PersistLiteral_ Escaped bs ->
                Right (UUID bs)
            _ ->
                Left "nope"

instance PersistFieldSql UUID where
    sqlType _ = SqlOther UUID

With this instance at the ready, we can now create our implicit definition:

uuidDef :: ImplicitIdDef
uuidDef = mkImplicitIdDef @UUID "uuid_generate_v1mc()"

And we can use setImplicitIdDef to use this with the MkPersistSettings for our block.

mkPersist (setImplicitIdDef uuidDef sqlSettings) [persistLowerCase| ... |]

TODO: either explain interaction with mkMigrate or fix it. see issue #1249 for more details.

Since: persistent-2.13.0.0

data EntityJSON #

Constructors

EntityJSON 

Fields

data MkPersistSettings #

Settings to be passed to the mkPersist function.

persistWith :: PersistSettings -> QuasiQuoter #

Converts a quasi-quoted syntax into a list of entity definitions, to be used as input to the template haskell generation code (mkPersist).

persistFileWith :: PersistSettings -> FilePath -> Q Exp #

Same as persistWith, but uses an external file instead of a quasiquotation. The recommended file extension is .persistentmodels.

persistManyFileWith :: PersistSettings -> [FilePath] -> Q Exp #

Same as persistFileWith, but uses several external files instead of one. Splitting your Persistent definitions into multiple modules can potentially dramatically speed up compile times.

The recommended file extension is .persistentmodels.

Examples

Expand

Split your Persistent definitions into multiple files (models1, models2), then create a new module for each new file and run mkPersist there:

-- Model1.hs
share
    [mkPersist sqlSettings]
    $(persistFileWith lowerCaseSettings "models1")
-- Model2.hs
share
    [mkPersist sqlSettings]
    $(persistFileWith lowerCaseSettings "models2")

Use persistManyFileWith to create your migrations:

-- Migrate.hs
share
    [mkMigrate "migrateAll"]
    $(persistManyFileWith lowerCaseSettings ["models1.persistentmodels","models2.persistentmodels"])

Tip: To get the same import behavior as if you were declaring all your models in one file, import your new files as Name into another file, then export module Name.

This approach may be used in the future to reduce memory usage during compilation, but so far we've only seen mild reductions.

See persistent#778 and persistent#791 for more details.

Since: persistent-2.5.4

embedEntityDefs #

Arguments

:: [EntityDef]

A list of EntityDef that have been defined in a previous mkPersist call.

Since: persistent-2.13.0.0

-> [UnboundEntityDef] 
-> [UnboundEntityDef] 

Takes a list of (potentially) independently defined entities and properly links all foreign keys to reference the right EntityDef, tying the knot between entities.

Allows users to define entities indepedently or in separate modules and then fix the cross-references between them at runtime to create a Migration.

Since: persistent-2.7.2

parseReferences :: PersistSettings -> Text -> Q Exp #

Calls parse to Quasi.parse individual entities in isolation afterwards, sets references to other entities

In 2.13.0.0, this was changed to splice in [UnboundEntityDef] instead of [EntityDef].

Since: persistent-2.5.3

mkPersist :: MkPersistSettings -> [UnboundEntityDef] -> Q [Dec] #

Create data types and appropriate PersistEntity instances for the given EntityDefs. Works well with the persist quasi-quoter.

mkPersistWith :: MkPersistSettings -> [EntityDef] -> [UnboundEntityDef] -> Q [Dec] #

Like '

Since: persistent-2.13.0.0

setImplicitIdDef :: ImplicitIdDef -> MkPersistSettings -> MkPersistSettings #

Set the ImplicitIdDef in the given MkPersistSettings. The default value is autoIncrementingInteger.

Since: persistent-2.13.0.0

mkPersistSettings #

Arguments

:: Type

Value for mpsBackend

-> MkPersistSettings 

Create an MkPersistSettings with default values.

sqlSettings :: MkPersistSettings #

Use the SqlPersist backend.

lensPTH :: (s -> a) -> (s -> b -> t) -> Lens s t a b #

pkNewtype :: MkPersistSettings -> UnboundEntityDef -> Bool #

Returns True if the key definition has less than 2 fields.

Since: persistent-2.11.0.0

fieldError :: Text -> Text -> Text -> Text #

Render an error message based on the tableName and fieldName with the provided message.

Since: persistent-2.8.2

persistFieldFromEntity :: MkPersistSettings -> UnboundEntityDef -> Q [Dec] #

Produce code similar to the following:

  instance PersistEntity e => PersistField e where
     toPersistValue = entityToPersistValueHelper
     fromPersistValue = entityFromPersistValueHelper ["col1", "col2"]
     sqlType _ = SqlString

share :: [[a] -> Q [Dec]] -> [a] -> Q [Dec] #

Apply the given list of functions to the same EntityDefs.

This function is useful for cases such as:

>>> share [mkSave "myDefs", mkPersist sqlSettings] [persistLowerCase|...|]

mkSave :: String -> [EntityDef] -> Q [Dec] #

Save the EntityDefs passed in under the given name.

This function was deprecated in persistent-2.13.0.0. It doesn't properly fix foreign keys. Please refer to mkEntityDefList for a replacement.

mkDeleteCascade :: MkPersistSettings -> [UnboundEntityDef] -> Q [Dec] #

Generate a DeleteCascade instance for the given EntityDefs.

This function is deprecated as of 2.13.0.0. You can now set cascade behavior directly in the quasiquoter.

mkEntityDefList #

Arguments

:: String

The name that will be given to the EntityDef list.

-> [UnboundEntityDef] 
-> Q [Dec] 

Creates a declaration for the [EntityDef] from the persistent schema. This is necessary because the Persistent QuasiQuoter is unable to know the correct type of ID fields, and assumes that they are all Int64.

Provide this in the list you give to share, much like mkMigrate.

share [mkMigrate "migrateAll", mkEntityDefList "entityDefs"] [...]

Since: persistent-2.7.1

derivePersistField :: String -> Q [Dec] #

Automatically creates a valid PersistField instance for any datatype that has valid Show and Read instances. Can be very convenient for Enum types.

derivePersistFieldJSON :: String -> Q [Dec] #

Automatically creates a valid PersistField instance for any datatype that has valid ToJSON and FromJSON instances. For a datatype T it generates instances similar to these:

   instance PersistField T where
       toPersistValue = PersistByteString . L.toStrict . encode
       fromPersistValue = (left T.pack) . eitherDecodeStrict' <=< fromPersistValue
   instance PersistFieldSql T where
       sqlType _ = SqlString

migrateModels :: [EntityDef] -> Migration #

The basic function for migrating models, no Template Haskell required.

It's probably best to use this in concert with mkEntityDefList, and then call migrateModels with the result from that function.

share [mkPersist sqlSettings, mkEntityDefList "entities"] [persistLowerCase| ... |]

migrateAll = migrateModels entities

The function mkMigrate currently implements exactly this behavior now. If you're splitting up the entity definitions into separate files, then it is better to use the entity definition list and the concatenate all the models together into a big list to call with migrateModels.

module Foo where

    share [mkPersist s, mkEntityDefList "fooModels"] ...


module Bar where

    share [mkPersist s, mkEntityDefList "barModels"] ...

module Migration where

    import Foo
    import Bar

    migrateAll = migrateModels (fooModels <> barModels)

Since: persistent-2.13.0.0

mkMigrate :: String -> [UnboundEntityDef] -> Q [Dec] #

Creates a single function to perform all migrations for the entities defined here. One thing to be aware of is dependencies: if you have entities with foreign references, make sure to place those definitions after the entities they reference.

In persistent-2.13.0.0, this was changed to *ignore* the input entity def list, and instead defer to mkEntityDefList to get the correct entities. This avoids problems where the QuasiQuoter is unable to know what the right reference types are. This sets mkPersist to be the "single source of truth" for entity definitions.

class PathMultiPiece s where #

Instances

Instances details
PathPiece a => PathMultiPiece [a] 
Instance details

Defined in Web.PathPieces

Methods

fromPathMultiPiece :: [Text] -> Maybe [a] #

toPathMultiPiece :: [a] -> [Text] #

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

class Monad m => MonadLogger (m :: Type -> Type) #

A Monad which has the ability to log messages in some manner.

Instances

Instances details
MonadIO m => MonadLogger (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> LoggingT m () #

Monad m => MonadLogger (NoLoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> NoLoggingT m () #

Monad m => MonadLogger (WriterLoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> WriterLoggingT m () #

MonadLogger m => MonadLogger (ResourceT m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> ResourceT m () #

MonadLogger m => MonadLogger (ListT m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> ListT m () #

MonadLogger m => MonadLogger (MaybeT m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> MaybeT m () #

MonadLogger (HandlerFor site) 
Instance details

Defined in Yesod.Core.Types

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> HandlerFor site () #

MonadLogger (WidgetFor site) 
Instance details

Defined in Yesod.Core.Types

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> WidgetFor site () #

(MonadLogger m, Error e) => MonadLogger (ErrorT e m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> ErrorT e m () #

MonadLogger m => MonadLogger (ExceptT e m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> ExceptT e m () #

MonadLogger m => MonadLogger (IdentityT m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> IdentityT m () #

MonadLogger m => MonadLogger (ReaderT r m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> ReaderT r m () #

MonadLogger m => MonadLogger (StateT s m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> StateT s m () #

MonadLogger m => MonadLogger (StateT s m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> StateT s m () #

(MonadLogger m, Monoid w) => MonadLogger (WriterT w m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> WriterT w m () #

(MonadLogger m, Monoid w) => MonadLogger (WriterT w m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> WriterT w m () #

MonadLogger (SubHandlerFor child master) 
Instance details

Defined in Yesod.Core.Types

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> SubHandlerFor child master () #

MonadLogger m => MonadLogger (ConduitM i o m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> ConduitM i o m () #

MonadLogger m => MonadLogger (ContT r m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> ContT r m () #

(MonadLogger m, Monoid w) => MonadLogger (RWST r w s m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> RWST r w s m () #

(MonadLogger m, Monoid w) => MonadLogger (RWST r w s m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> RWST r w s m () #

MonadLogger m => MonadLogger (Pipe l i o u m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> Pipe l i o u m () #

data LogLevel #

Instances

Instances details
Read LogLevel 
Instance details

Defined in Control.Monad.Logger

Show LogLevel 
Instance details

Defined in Control.Monad.Logger

Eq LogLevel 
Instance details

Defined in Control.Monad.Logger

Ord LogLevel 
Instance details

Defined in Control.Monad.Logger

Lift LogLevel 
Instance details

Defined in Control.Monad.Logger

Methods

lift :: Quote m => LogLevel -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => LogLevel -> Code m LogLevel #

logDebug :: Q Exp #

Generates a function that takes a Text and logs a LevelDebug message. Usage:

$(logDebug) "This is a debug log message"

logOther :: Text -> Q Exp #

Generates a function that takes a Text and logs a LevelOther message. Usage:

$(logOther "My new level") "This is a log message"

logDebugS :: Q Exp #

Generates a function that takes a LogSource and Text and logs a LevelDebug message. Usage:

$logDebugS "SomeSource" "This is a debug log message"

logOtherS :: Q Exp #

Generates a function that takes a LogSource, a level name and a Text and logs a LevelOther message. Usage:

$logOtherS "SomeSource" "My new level" "This is a log message"

type ByteRanges = [ByteRange] #

RFC 2616 Byte ranges (set).

data ByteRange #

RFC 2616 Byte range (individual).

Negative indices are not allowed!

Instances

Instances details
Data ByteRange 
Instance details

Defined in Network.HTTP.Types.Header

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ByteRange -> c ByteRange #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ByteRange #

toConstr :: ByteRange -> Constr #

dataTypeOf :: ByteRange -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ByteRange) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ByteRange) #

gmapT :: (forall b. Data b => b -> b) -> ByteRange -> ByteRange #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ByteRange -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ByteRange -> r #

gmapQ :: (forall d. Data d => d -> u) -> ByteRange -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ByteRange -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ByteRange -> m ByteRange #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ByteRange -> m ByteRange #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ByteRange -> m ByteRange #

Show ByteRange 
Instance details

Defined in Network.HTTP.Types.Header

Eq ByteRange 
Instance details

Defined in Network.HTTP.Types.Header

Ord ByteRange 
Instance details

Defined in Network.HTTP.Types.Header

type HeaderName = CI ByteString #

Header name

parseByteRanges :: ByteString -> Maybe ByteRanges #

Parse the value of a Range header into a ByteRanges.

>>> parseByteRanges "error"
Nothing
>>> parseByteRanges "bytes=0-499"
Just [ByteRangeFromTo 0 499]
>>> parseByteRanges "bytes=500-999"
Just [ByteRangeFromTo 500 999]
>>> parseByteRanges "bytes=-500"
Just [ByteRangeSuffix 500]
>>> parseByteRanges "bytes=9500-"
Just [ByteRangeFrom 9500]
>>> parseByteRanges "bytes=0-0,-1"
Just [ByteRangeFromTo 0 0,ByteRangeSuffix 1]
>>> parseByteRanges "bytes=500-600,601-999"
Just [ByteRangeFromTo 500 600,ByteRangeFromTo 601 999]
>>> parseByteRanges "bytes=500-700,601-999"
Just [ByteRangeFromTo 500 700,ByteRangeFromTo 601 999]

data StdMethod #

HTTP standard method (as defined by RFC 2616, and PATCH which is defined by RFC 5789).

Constructors

GET 
POST 
HEAD 
PUT 
DELETE 
TRACE 
CONNECT 
OPTIONS 
PATCH 

Instances

Instances details
Bounded StdMethod 
Instance details

Defined in Network.HTTP.Types.Method

Enum StdMethod 
Instance details

Defined in Network.HTTP.Types.Method

Ix StdMethod 
Instance details

Defined in Network.HTTP.Types.Method

Read StdMethod 
Instance details

Defined in Network.HTTP.Types.Method

Show StdMethod 
Instance details

Defined in Network.HTTP.Types.Method

Eq StdMethod 
Instance details

Defined in Network.HTTP.Types.Method

Ord StdMethod 
Instance details

Defined in Network.HTTP.Types.Method

type Method = ByteString #

HTTP method (flat string type).

methodGet :: Method #

HTTP Method constants.

methodPost :: Method #

HTTP Method constants.

methodHead :: Method #

HTTP Method constants.

methodPut :: Method #

HTTP Method constants.

methodDelete :: Method #

HTTP Method constants.

methodTrace :: Method #

HTTP Method constants.

methodConnect :: Method #

HTTP Method constants.

methodOptions :: Method #

HTTP Method constants.

methodPatch :: Method #

HTTP Method constants.

parseMethod :: Method -> Either ByteString StdMethod #

Convert a method ByteString to a StdMethod if possible.

renderMethod :: Either ByteString StdMethod -> Method #

Convert an algebraic method to a ByteString.

renderStdMethod :: StdMethod -> Method #

Convert a StdMethod to a ByteString.

data Status #

HTTP Status.

Only the statusCode is used for comparisons.

Please use mkStatus to create status codes from code and message, or the Enum instance or the status code constants (like ok200). There might be additional record members in the future.

Note that the Show instance is only for debugging.

Constructors

Status 

Instances

Instances details
Bounded Status 
Instance details

Defined in Network.HTTP.Types.Status

Enum Status 
Instance details

Defined in Network.HTTP.Types.Status

Show Status 
Instance details

Defined in Network.HTTP.Types.Status

Eq Status 
Instance details

Defined in Network.HTTP.Types.Status

Methods

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

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

Ord Status 
Instance details

Defined in Network.HTTP.Types.Status

mkStatus :: Int -> ByteString -> Status #

Create a Status from status code and message.

status100 :: Status #

Continue 100

continue100 :: Status #

Continue 100

status101 :: Status #

Switching Protocols 101

switchingProtocols101 :: Status #

Switching Protocols 101

status200 :: Status #

OK 200

ok200 :: Status #

OK 200

status201 :: Status #

Created 201

created201 :: Status #

Created 201

status202 :: Status #

Accepted 202

accepted202 :: Status #

Accepted 202

status203 :: Status #

Non-Authoritative Information 203

nonAuthoritative203 :: Status #

Non-Authoritative Information 203

status204 :: Status #

No Content 204

noContent204 :: Status #

No Content 204

status205 :: Status #

Reset Content 205

resetContent205 :: Status #

Reset Content 205

status206 :: Status #

Partial Content 206

partialContent206 :: Status #

Partial Content 206

status300 :: Status #

Multiple Choices 300

multipleChoices300 :: Status #

Multiple Choices 300

status301 :: Status #

Moved Permanently 301

movedPermanently301 :: Status #

Moved Permanently 301

status302 :: Status #

Found 302

found302 :: Status #

Found 302

status303 :: Status #

See Other 303

seeOther303 :: Status #

See Other 303

status304 :: Status #

Not Modified 304

notModified304 :: Status #

Not Modified 304

status305 :: Status #

Use Proxy 305

useProxy305 :: Status #

Use Proxy 305

status307 :: Status #

Temporary Redirect 307

temporaryRedirect307 :: Status #

Temporary Redirect 307

status308 :: Status #

Permanent Redirect 308

permanentRedirect308 :: Status #

Permanent Redirect 308

status400 :: Status #

Bad Request 400

badRequest400 :: Status #

Bad Request 400

status401 :: Status #

Unauthorized 401

unauthorized401 :: Status #

Unauthorized 401

status402 :: Status #

Payment Required 402

paymentRequired402 :: Status #

Payment Required 402

status403 :: Status #

Forbidden 403

forbidden403 :: Status #

Forbidden 403

status404 :: Status #

Not Found 404

notFound404 :: Status #

Not Found 404

status405 :: Status #

Method Not Allowed 405

methodNotAllowed405 :: Status #

Method Not Allowed 405

status406 :: Status #

Not Acceptable 406

notAcceptable406 :: Status #

Not Acceptable 406

status407 :: Status #

Proxy Authentication Required 407

proxyAuthenticationRequired407 :: Status #

Proxy Authentication Required 407

status408 :: Status #

Request Timeout 408

requestTimeout408 :: Status #

Request Timeout 408

status409 :: Status #

Conflict 409

conflict409 :: Status #

Conflict 409

status410 :: Status #

Gone 410

gone410 :: Status #

Gone 410

status411 :: Status #

Length Required 411

lengthRequired411 :: Status #

Length Required 411

status412 :: Status #

Precondition Failed 412

preconditionFailed412 :: Status #

Precondition Failed 412

status413 :: Status #

Request Entity Too Large 413

requestEntityTooLarge413 :: Status #

Request Entity Too Large 413

status414 :: Status #

Request-URI Too Long 414

requestURITooLong414 :: Status #

Request-URI Too Long 414

status415 :: Status #

Unsupported Media Type 415

unsupportedMediaType415 :: Status #

Unsupported Media Type 415

status416 :: Status #

Requested Range Not Satisfiable 416

requestedRangeNotSatisfiable416 :: Status #

Requested Range Not Satisfiable 416

status417 :: Status #

Expectation Failed 417

expectationFailed417 :: Status #

Expectation Failed 417

status418 :: Status #

I'm a teapot 418

imATeapot418 :: Status #

I'm a teapot 418

status422 :: Status #

Unprocessable Entity 422 (RFC 4918)

unprocessableEntity422 :: Status #

Unprocessable Entity 422 (RFC 4918)

status428 :: Status #

Precondition Required 428 (RFC 6585)

preconditionRequired428 :: Status #

Precondition Required 428 (RFC 6585)

status429 :: Status #

Too Many Requests 429 (RFC 6585)

tooManyRequests429 :: Status #

Too Many Requests 429 (RFC 6585)

status431 :: Status #

Request Header Fields Too Large 431 (RFC 6585)

requestHeaderFieldsTooLarge431 :: Status #

Request Header Fields Too Large 431 (RFC 6585)

status500 :: Status #

Internal Server Error 500

internalServerError500 :: Status #

Internal Server Error 500

status501 :: Status #

Not Implemented 501

notImplemented501 :: Status #

Not Implemented 501

status502 :: Status #

Bad Gateway 502

badGateway502 :: Status #

Bad Gateway 502

status503 :: Status #

Service Unavailable 503

serviceUnavailable503 :: Status #

Service Unavailable 503

status504 :: Status #

Gateway Timeout 504

gatewayTimeout504 :: Status #

Gateway Timeout 504

status505 :: Status #

HTTP Version Not Supported 505

httpVersionNotSupported505 :: Status #

HTTP Version Not Supported 505

status511 :: Status #

Network Authentication Required 511 (RFC 6585)

networkAuthenticationRequired511 :: Status #

Network Authentication Required 511 (RFC 6585)

statusIsInformational :: Status -> Bool #

Informational class

statusIsSuccessful :: Status -> Bool #

Successful class

statusIsRedirection :: Status -> Bool #

Redirection class

statusIsClientError :: Status -> Bool #

Client Error class

statusIsServerError :: Status -> Bool #

Server Error class

type PartialEscapeQuery = [PartialEscapeQueryItem] #

Query with some chars that should not be escaped.

General form: a=b&c=d:e+f&g=h

data EscapeItem #

For some URIs characters must not be URI encoded, e.g. '+' or ':' in q=a+language:haskell+created:2009-01-01..2009-02-01&sort=stars The character list unreservedPI instead of unreservedQS would solve this. But we explicitly decide what part to encode. This is mandatory when searching for '+': q=%2B+language:haskell.

Constructors

QE ByteString 
QN ByteString 

type SimpleQuery = [SimpleQueryItem] #

Simplified Query type without support for parameter-less items.

type SimpleQueryItem = (ByteString, ByteString) #

Simplified Query item type without support for parameter-less items.

type QueryText = [(Text, Maybe Text)] #

Like Query, but with Text instead of ByteString (UTF8-encoded).

renderQueryText #

Arguments

:: Bool

prepend a question mark?

-> QueryText 
-> Builder 

Convert QueryText to a Builder.

queryToQueryText :: Query -> QueryText #

Convert Query to QueryText (leniently decoding the UTF-8).

parseQueryText :: ByteString -> QueryText #

Parse QueryText from a ByteString. See parseQuery for details.

renderQueryBuilder #

Arguments

:: Bool

prepend a question mark?

-> Query 
-> Builder 

Convert Query to a Builder.

renderQuery #

Arguments

:: Bool

prepend question mark?

-> Query 
-> ByteString 

Convert Query to ByteString.

renderSimpleQuery #

Arguments

:: Bool

prepend question mark?

-> SimpleQuery 
-> ByteString 

Convert SimpleQuery to ByteString.

parseQuery :: ByteString -> Query #

Split out the query string into a list of keys and values. A few importants points:

  • The result returned is still bytestrings, since we perform no character decoding here. Most likely, you will want to use UTF-8 decoding, but this is left to the user of the library.
  • Percent decoding errors are ignored. In particular, "%Q" will be output as "%Q".
  • It decodes '+' characters to ' '

parseSimpleQuery :: ByteString -> SimpleQuery #

Parse SimpleQuery from a ByteString.

urlEncodeBuilder #

Arguments

:: Bool

Whether input is in query string. True: Query string, False: Path element

-> ByteString 
-> Builder 

Percent-encoding for URLs (using Builder).

urlEncode #

Arguments

:: Bool

Whether to decode '+' to ' '

-> ByteString

The ByteString to encode as URL

-> ByteString

The encoded URL

Percent-encoding for URLs.

urlDecode #

Arguments

:: Bool

Whether to decode '+' to ' '

-> ByteString 
-> ByteString 

Percent-decoding.

encodePathSegments :: [Text] -> Builder #

Encodes a list of path segments into a valid URL fragment.

This function takes the following three steps:

  • UTF-8 encodes the characters.
  • Performs percent encoding on all unreserved characters, as well as :@=+$,
  • Prepends each segment with a slash.

For example:

encodePathSegments [\"foo\", \"bar\", \"baz\"]

"/foo/bar/baz"

encodePathSegments [\"foo bar\", \"baz\/bin\"]

"/foo%20bar/baz%2Fbin"

encodePathSegments [\"שלום\"]

"/%D7%A9%D7%9C%D7%95%D7%9D"

Huge thanks to Jeremy Shaw who created the original implementation of this function in web-routes and did such thorough research to determine all correct escaping procedures.

decodePathSegments :: ByteString -> [Text] #

Parse a list of path segments from a valid URL fragment.

extractPath :: ByteString -> ByteString #

Extract whole path (path segments + query) from a RFC 2616 Request-URI.

>>> extractPath "/path"
"/path"
>>> extractPath "http://example.com:8080/path"
"/path"
>>> extractPath "http://example.com"
"/"
>>> extractPath ""
"/"

encodePath :: [Text] -> Query -> Builder #

Encode a whole path (path segments + query).

decodePath :: ByteString -> ([Text], Query) #

Decode a whole path (path segments + query).

renderQueryPartialEscape #

Arguments

:: Bool

prepend question mark?

-> PartialEscapeQuery 
-> ByteString 

Convert PartialEscapeQuery to ByteString.

renderQueryBuilderPartialEscape #

Arguments

:: Bool

prepend a question mark?

-> PartialEscapeQuery 
-> Builder 

Convert PartialEscapeQuery to a Builder.

class QueryLike a where #

Types which can, and commonly are, converted to Query are in this class.

You can use lists of simple key value pairs, with ByteString (strict, or lazy: ByteString), Text, or String as the key/value types. You can also have the value type lifted into a Maybe to support keys without values; and finally it is possible to put each pair into a Maybe for key-value pairs that aren't always present.

Methods

toQuery :: a -> Query #

Convert to Query.

Instances

Instances details
(QueryKeyLike k, QueryValueLike v) => QueryLike [Maybe (k, v)] 
Instance details

Defined in Network.HTTP.Types.QueryLike

Methods

toQuery :: [Maybe (k, v)] -> Query #

(QueryKeyLike k, QueryValueLike v) => QueryLike [(k, v)] 
Instance details

Defined in Network.HTTP.Types.QueryLike

Methods

toQuery :: [(k, v)] -> Query #

data HttpVersion #

HTTP Version.

Note that the Show instance is intended merely for debugging.

Constructors

HttpVersion 

Fields

http09 :: HttpVersion #

HTTP 0.9

http10 :: HttpVersion #

HTTP 1.0

http11 :: HttpVersion #

HTTP 1.1

http20 :: HttpVersion #

HTTP 2.0

type QueryItem = (ByteString, Maybe ByteString) #

Query item

type Query = [QueryItem] #

Query.

General form: a=b&c=d, but if the value is Nothing, it becomes a&c=d.

type Header = (HeaderName, ByteString) #

Header

type RequestHeaders = [Header] #

Request Headers

type ResponseHeaders = [Header] #

Response Headers

withResponse :: forall m (n :: Type -> Type) env i a. (MonadUnliftIO m, MonadIO n, MonadReader env m, HasHttpManager env) => Request -> (Response (ConduitM i ByteString n ()) -> m a) -> m a #

Conduit powered version of withResponse. Differences are:

  • Response body is represented as a Producer.
  • Generalized to any instance of MonadUnliftIO, not just IO.
  • The Manager is contained by a MonadReader context.

Since 2.1.0

acquireResponse :: forall (n :: Type -> Type) env m i. (MonadIO n, MonadReader env m, HasHttpManager env) => Request -> m (Acquire (Response (ConduitM i ByteString n ()))) #

An Acquire for getting a Response.

Since 2.1.0

defaultManagerSettings :: ManagerSettings #

TLS-powered manager settings.

Since 2.1.0

newManager :: MonadIO m => m Manager #

Get a new manager using defaultManagerSettings.

Since 2.1.0

newManagerSettings :: MonadIO m => ManagerSettings -> m Manager #

Get a new manager using the given settings.

Since 2.1.0

responseOpen :: forall m (n :: Type -> Type) env i. (MonadIO m, MonadIO n, MonadReader env m, HasHttpManager env) => Request -> m (Response (ConduitM i ByteString n ())) #

Conduit-powered version of responseOpen.

See withResponse for the differences with responseOpen.

Since 2.1.0

responseClose :: MonadIO m => Response body -> m () #

Generalized version of responseClose.

Since 2.1.0

bodyReaderSource :: forall (m :: Type -> Type) i. MonadIO m => BodyReader -> ConduitM i ByteString m () #

httpLbs :: (MonadIO m, HasHttpManager env, MonadReader env m) => Request -> m (Response ByteString) #

Same as httpLbs, except it uses the Manager in the reader environment.

Since 2.1.1

httpNoBody :: (MonadIO m, HasHttpManager env, MonadReader env m) => Request -> m (Response ()) #

Same as httpNoBody, except it uses the Manager in the reader environment.

This can be more convenient that using withManager as it avoids the need to specify the base monad for the response body.

Since 2.1.2

httpSource :: forall (m :: Type -> Type) (n :: Type -> Type) env r. (MonadResource m, MonadIO n, MonadReader env m, HasHttpManager env) => Request -> (Response (ConduitM () ByteString n ()) -> ConduitM () r m ()) -> ConduitM () r m () #

Same as httpSource, but uses Manager from Reader environment instead of the global one.

Since 2.3.6

class HasHttpManager a where #

Methods

getHttpManager :: a -> Manager #

Instances

Instances details
HasHttpManager App Source # 
Instance details

Defined in BtcLsp.Yesod.Foundation

HasHttpManager Manager 
Instance details

Defined in Network.HTTP.Client.Types

data Manager #

Keeps track of open connections for keep-alive.

If possible, you should share a single Manager between multiple threads and requests.

Since 0.1.0

Instances

Instances details
HasHttpManager Manager 
Instance details

Defined in Network.HTTP.Client.Types

data ProxyOverride #

How the HTTP proxy server settings should be discovered.

Since 0.4.7

data ManagerSettings #

Settings for a Manager. Please use the defaultManagerSettings function and then modify individual settings. For more information, see http://www.yesodweb.com/book/settings-types.

Since 0.1.0

data Response body #

A simple representation of the HTTP response.

Since 0.1.0

Instances

Instances details
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 #

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

Functor Response 
Instance details

Defined in Network.HTTP.Client.Types

Methods

fmap :: (a -> b) -> Response a -> Response b #

(<$) :: a -> Response b -> Response a #

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 #

data ResponseTimeout #

How to deal with timing out on retrieval of response headers.

Since: http-client-0.5.0

data Request #

All information on how to connect to a host and what should be sent in the HTTP request.

If you simply wish to download from a URL, see parseRequest.

The constructor for this data type is not exposed. Instead, you should use either the defaultRequest value, or parseRequest to construct from a URL, and then use the records below to make modifications. This approach allows http-client to add configuration options without breaking backwards compatibility.

For example, to construct a POST request, you could do something like:

initReq <- parseRequest "http://www.example.com/path"
let req = initReq
            { method = "POST"
            }

For more information, please see http://www.yesodweb.com/book/settings-types.

Since 0.1.0

Instances

Instances details
Show Request 
Instance details

Defined in Network.HTTP.Client.Types

type GivesPopper a = NeedsPopper a -> IO a #

A function which will provide a Popper to a NeedsPopper. This seemingly convoluted structure allows for creation of request bodies which allocate scarce resources in an exception safe manner.

Since 0.1.0

type NeedsPopper a = Popper -> IO a #

A function which must be provided with a Popper.

Since 0.1.0

type Popper = IO ByteString #

A function which generates successive chunks of a request body, provider a single empty bytestring when no more data is available.

Since 0.1.0

data RequestBody #

When using one of the RequestBodyStream / RequestBodyStreamChunked constructors, you must ensure that the GivesPopper can be called multiple times. Usually this is not a problem.

The RequestBodyStreamChunked will send a chunked request body. Note that not all servers support this. Only use RequestBodyStreamChunked if you know the server you're sending to supports chunked request bodies.

Since 0.1.0

Constructors

RequestBodyLBS ByteString 
RequestBodyBS ByteString 
RequestBodyBuilder Int64 Builder 
RequestBodyStream Int64 (GivesPopper ()) 
RequestBodyStreamChunked (GivesPopper ()) 
RequestBodyIO (IO RequestBody)

Allows creation of a RequestBody inside the IO monad, which is useful for making easier APIs (like setRequestBodyFile).

Since: http-client-0.4.28

data Proxy #

Define a HTTP proxy, consisting of a hostname and port number.

Constructors

Proxy 

Fields

Instances

Instances details
Read Proxy 
Instance details

Defined in Network.HTTP.Client.Types

Show Proxy 
Instance details

Defined in Network.HTTP.Client.Types

Methods

showsPrec :: Int -> Proxy -> ShowS #

show :: Proxy -> String #

showList :: [Proxy] -> ShowS #

Eq Proxy 
Instance details

Defined in Network.HTTP.Client.Types

Methods

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

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

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 #

data HttpExceptionContent #

Constructors

StatusCodeException (Response ()) ByteString

Generated by the parseUrlThrow function when the server returns a non-2XX response status code.

May include the beginning of the response body.

Since: http-client-0.5.0

TooManyRedirects [Response ByteString]

The server responded with too many redirects for a request.

Contains the list of encountered responses containing redirects in reverse chronological order; including last redirect, which triggered the exception and was not followed.

Since: http-client-0.5.0

OverlongHeaders

Either too many headers, or too many total bytes in a single header, were returned by the server, and the memory exhaustion protection in this library has kicked in.

Since: http-client-0.5.0

ResponseTimeout

The server took too long to return a response. This can be altered via responseTimeout or managerResponseTimeout.

Since: http-client-0.5.0

ConnectionTimeout

Attempting to connect to the server timed out.

Since: http-client-0.5.0

ConnectionFailure SomeException

An exception occurred when trying to connect to the server.

Since: http-client-0.5.0

InvalidStatusLine ByteString

The status line returned by the server could not be parsed.

Since: http-client-0.5.0

InvalidHeader ByteString

The given response header line could not be parsed

Since: http-client-0.5.0

InvalidRequestHeader ByteString

The given request header is not compliant (e.g. has newlines)

Since: http-client-0.5.14

InternalException SomeException

An exception was raised by an underlying library when performing the request. Most often, this is caused by a failing socket action or a TLS exception.

Since: http-client-0.5.0

ProxyConnectException ByteString Int Status

A non-200 status code was returned when trying to connect to the proxy server on the given host and port.

Since: http-client-0.5.0

NoResponseDataReceived

No response data was received from the server at all. This exception may deserve special handling within the library, since it may indicate that a pipelining has been used, and a connection thought to be open was in fact closed.

Since: http-client-0.5.0

TlsNotSupported

Exception thrown when using a Manager which does not have support for secure connections. Typically, you will want to use tlsManagerSettings from http-client-tls to overcome this.

Since: http-client-0.5.0

WrongRequestBodyStreamSize Word64 Word64

The request body provided did not match the expected size.

Provides the expected and actual size.

Since: http-client-0.4.31

ResponseBodyTooShort Word64 Word64

The returned response body is too short. Provides the expected size and actual size.

Since: http-client-0.5.0

InvalidChunkHeaders

A chunked response body had invalid headers.

Since: http-client-0.5.0

IncompleteHeaders

An incomplete set of response headers were returned.

Since: http-client-0.5.0

InvalidDestinationHost ByteString

The host we tried to connect to is invalid (e.g., an empty string).

HttpZlibException ZlibException

An exception was thrown when inflating a response body.

Since: http-client-0.5.0

InvalidProxyEnvironmentVariable Text Text

Values in the proxy environment variable were invalid. Provides the environment variable name and its value.

Since: http-client-0.5.0

ConnectionClosed

Attempted to use a Connection which was already closed

Since: http-client-0.5.0

InvalidProxySettings Text

Proxy settings are not valid (Windows specific currently) @since 0.5.7

data HttpException #

An exception which may be generated by this library

Since: http-client-0.5.0

Constructors

HttpExceptionRequest Request HttpExceptionContent

Most exceptions are specific to a Request. Inspect the HttpExceptionContent value for details on what occurred.

Since: http-client-0.5.0

InvalidUrlException String String

A URL (first field) is invalid for a given reason (second argument).

Since: http-client-0.5.0

equalCookie :: Cookie -> Cookie -> Bool #

Instead of (==).

Since there was some confusion in the history of this library about how the Eq instance should work, it was removed for clarity, and replaced by equal and equiv. equal gives you equality of all fields of the Cookie record.

Since: http-client-0.7.0

equivCookie :: Cookie -> Cookie -> Bool #

Equality of name, domain, path only. This corresponds to step 11 of the algorithm described in Section 5.3 "Storage Model". See also: equal.

Since: http-client-0.7.0

compareCookies :: Cookie -> Cookie -> Ordering #

Instead of instance Ord Cookie. See equalCookie, equivCookie.

Since: http-client-0.7.0

equalCookieJar :: CookieJar -> CookieJar -> Bool #

See equalCookie.

Since: http-client-0.7.0

equivCookieJar :: CookieJar -> CookieJar -> Bool #

See equalCookieJar, equalCookie.

Since: http-client-0.7.0

makeConnection #

Arguments

:: IO ByteString

read

-> (ByteString -> IO ())

write

-> IO ()

close

-> IO Connection 

Create a new Connection from a read, write, and close function.

Since: http-client-0.5.3

socketConnection #

Arguments

:: Socket 
-> Int

chunk size

-> IO Connection 

Create a new Connection from a Socket.

Since: http-client-0.5.3

strippedHostName :: String -> String #

strippedHostName takes a URI host name, as extracted by regName, and strips square brackets around IPv6 addresses.

The result is suitable for passing to services such as name resolution (getAddr).

@since

brReadSome :: BodyReader -> Int -> IO ByteString #

Continuously call brRead, building up a lazy ByteString until a chunk is constructed that is at least as many bytes as requested.

Since 0.4.20

parseUrl :: MonadThrow m => String -> m Request #

Deprecated synonym for parseUrlThrow. You probably want parseRequest or parseRequest_ instead.

Since: http-client-0.1.0

parseUrlThrow :: MonadThrow m => String -> m Request #

Same as parseRequest, except will throw an HttpException in the event of a non-2XX response. This uses throwErrorStatusCodes to implement checkResponse.

Since: http-client-0.4.30

throwErrorStatusCodes :: MonadIO m => Request -> Response BodyReader -> m () #

Throws a StatusCodeException wrapped in HttpExceptionRequest, if the response's status code indicates an error (if it isn't 2xx). This can be used to implement checkResponse.

Since: http-client-0.5.13

parseRequest :: MonadThrow m => String -> m Request #

Convert a URL into a Request.

This function defaults some of the values in Request, such as setting method to GET and requestHeaders to [].

Since this function uses MonadThrow, the return monad can be anything that is an instance of MonadThrow, such as IO or Maybe.

You can place the request method at the beginning of the URL separated by a space, e.g.:

@@ parseRequest "POST http://httpbin.org/post" @@

Note that the request method must be provided as all capital letters.

A Request created by this function won't cause exceptions on non-2XX response status codes.

To create a request which throws on non-2XX status codes, see parseUrlThrow

Since: http-client-0.4.30

parseRequest_ :: String -> Request #

Same as parseRequest, but parse errors cause an impure exception. Mostly useful for static strings which are known to be correctly formatted.

requestFromURI :: MonadThrow m => URI -> m Request #

Convert a URI into a Request.

This can fail if the given URI is not absolute, or if the URI scheme is not "http" or "https". In these cases the function will throw an error via MonadThrow.

This function defaults some of the values in Request, such as setting method to GET and requestHeaders to [].

A Request created by this function won't cause exceptions on non-2XX response status codes.

Since: http-client-0.5.12

requestFromURI_ :: URI -> Request #

Same as requestFromURI, but if the conversion would fail, throws an impure exception.

Since: http-client-0.5.12

getUri :: Request -> URI #

Extract a URI from the request.

Since 0.1.0

defaultRequest :: Request #

A default request value, a GET request of localhost/:80, with an empty request body.

Note that the default checkResponse does nothing.

Since: http-client-0.4.30

applyBasicAuth :: ByteString -> ByteString -> Request -> Request #

Add a Basic Auth header (with the specified user name and password) to the given Request. Ignore error handling:

 applyBasicAuth "user" "pass" $ parseRequest_ url

NOTE: The function applyDigestAuth is provided by the http-client-tls package instead of this package due to extra dependencies. Please use that package if you need to use digest authentication.

Since 0.1.0

applyBearerAuth :: ByteString -> Request -> Request #

Add a Bearer Auth header to the given Request

Since: http-client-0.7.6

applyBasicProxyAuth :: ByteString -> ByteString -> Request -> Request #

Add a Proxy-Authorization header (with the specified username and password) to the given Request. Ignore error handling:

applyBasicProxyAuth "user" "pass" <$> parseRequest "http://example.org"

Since 0.3.4

urlEncodedBody :: [(ByteString, ByteString)] -> Request -> Request #

Add url-encoded parameters to the Request.

This sets a new requestBody, adds a content-type request header and changes the method to POST.

Since 0.1.0

setRequestIgnoreStatus :: Request -> Request #

Modify the request so that non-2XX status codes do not generate a runtime StatusCodeException.

Since: http-client-0.4.29

setRequestCheckStatus :: Request -> Request #

Modify the request so that non-2XX status codes generate a runtime StatusCodeException, by using throwErrorStatusCodes

Since: http-client-0.5.13

setQueryString :: [(ByteString, Maybe ByteString)] -> Request -> Request #

Set the query string to the given key/value pairs.

Since 0.3.6

setQueryStringPartialEscape :: [(ByteString, [EscapeItem])] -> Request -> Request #

Set the query string to the given key/value pairs.

Since: http-client-0.5.10

streamFile :: FilePath -> IO RequestBody #

Send a file as the request body.

It is expected that the file size does not change between calling streamFile and making any requests using this request body.

Since 0.4.9

observedStreamFile :: (StreamFileStatus -> IO ()) -> FilePath -> IO RequestBody #

Send a file as the request body, while observing streaming progress via a PopObserver. Observations are made between reading and sending a chunk.

It is expected that the file size does not change between calling observedStreamFile and making any requests using this request body.

Since 0.4.9

getOriginalRequest :: Response a -> Request #

Retrieve the orignal Request from a Response

Note that the requestBody is not available and always set to empty.

Since: http-client-0.7.8

rawConnectionModifySocket :: (Socket -> IO ()) -> IO (Maybe HostAddress -> String -> Int -> IO Connection) #

A value for the managerRawConnection setting, but also allows you to modify the underlying Socket to set additional settings. For a motivating use case, see: https://github.com/snoyberg/http-client/issues/71.

Since 0.3.8

rawConnectionModifySocketSize :: (Socket -> IO ()) -> IO (Int -> Maybe HostAddress -> String -> Int -> IO Connection) #

Same as rawConnectionModifySocket, but also takes in a chunk size.

Since: http-client-0.5.2

withManager :: ManagerSettings -> (Manager -> IO a) -> IO a #

Create, use and close a Manager.

Since 0.2.1

proxyFromRequest :: ProxyOverride #

Get the proxy settings from the Request itself.

Since 0.4.7

noProxy :: ProxyOverride #

Never connect using a proxy, regardless of the proxy value in the Request.

Since 0.4.7

useProxy :: Proxy -> ProxyOverride #

Use the given proxy settings, regardless of the proxy value in the Request.

Since 0.4.7

useProxySecureWithoutConnect :: Proxy -> ProxyOverride #

Send secure requests to the proxy in plain text rather than using CONNECT, regardless of the value in the Request.

Since: http-client-0.7.2

proxyEnvironment #

Arguments

:: Maybe Proxy

fallback if no environment set

-> ProxyOverride 

Get the proxy settings from the default environment variable (http_proxy for insecure, https_proxy for secure). If no variable is set, then fall back to the given value. Nothing is equivalent to noProxy, Just is equivalent to useProxy.

Since 0.4.7

proxyEnvironmentNamed #

Arguments

:: Text

environment variable name

-> Maybe Proxy

fallback if no environment set

-> ProxyOverride 

Same as proxyEnvironment, but instead of default environment variable names, allows you to set your own name.

Since 0.4.7

defaultProxy :: ProxyOverride #

The default proxy settings for a manager. In particular: if the http_proxy (or https_proxy) environment variable is set, use it. Otherwise, use the values in the Request.

Since 0.4.7

domainMatches #

Arguments

:: ByteString

Domain to test

-> ByteString

Domain from a cookie

-> Bool 

This corresponds to the subcomponent algorithm entitled "Domain Matching" detailed in section 5.1.3

defaultPath :: Request -> ByteString #

This corresponds to the subcomponent algorithm entitled "Paths" detailed in section 5.1.4

pathMatches :: ByteString -> ByteString -> Bool #

This corresponds to the subcomponent algorithm entitled "Path-Match" detailed in section 5.1.4

isPotentiallyTrustworthyOrigin #

Arguments

:: Bool

True if HTTPS

-> ByteString

Host

-> Bool

Whether or not the origin is potentially trustworthy

Algorithm described in "Secure Contexts", Section 3.1, "Is origin potentially trustworthy?"

Note per RFC6265 section 5.4 user agent is free to define the meaning of "secure" protocol.

See: https://w3c.github.io/webappsec-secure-contexts/#is-origin-trustworthy

evictExpiredCookies #

Arguments

:: CookieJar

Input cookie jar

-> UTCTime

Value that should be used as "now"

-> CookieJar

Filtered cookie jar

This corresponds to the eviction algorithm described in Section 5.3 "Storage Model"

insertCookiesIntoRequest #

Arguments

:: Request

The request to insert into

-> CookieJar

Current cookie jar

-> UTCTime

Value that should be used as "now"

-> (Request, CookieJar)

(Output request, Updated cookie jar (last-access-time is updated))

This applies the computeCookieString to a given Request

computeCookieString #

Arguments

:: Request

Input request

-> CookieJar

Current cookie jar

-> UTCTime

Value that should be used as "now"

-> Bool

Whether or not this request is coming from an "http" source (not javascript or anything like that)

-> (ByteString, CookieJar)

(Contents of a "Cookie" header, Updated cookie jar (last-access-time is updated))

This corresponds to the algorithm described in Section 5.4 "The Cookie Header"

updateCookieJar #

Arguments

:: Response a

Response received from server

-> Request

Request which generated the response

-> UTCTime

Value that should be used as "now"

-> CookieJar

Current cookie jar

-> (CookieJar, Response a)

(Updated cookie jar with cookies from the Response, The response stripped of any "Set-Cookie" header)

This applies receiveSetCookie to a given Response

receiveSetCookie #

Arguments

:: SetCookie

The SetCookie the cookie jar is receiving

-> Request

The request that originated the response that yielded the SetCookie

-> UTCTime

Value that should be used as "now"

-> Bool

Whether or not this request is coming from an "http" source (not javascript or anything like that)

-> CookieJar

Input cookie jar to modify

-> CookieJar

Updated cookie jar

This corresponds to the algorithm described in Section 5.3 "Storage Model" This function consists of calling generateCookie followed by insertCheckedCookie. Use this function if you plan to do both in a row. generateCookie and insertCheckedCookie are only provided for more fine-grained control.

insertCheckedCookie #

Arguments

:: Cookie

The SetCookie the cookie jar is receiving

-> CookieJar

Input cookie jar to modify

-> Bool

Whether or not this request is coming from an "http" source (not javascript or anything like that)

-> CookieJar

Updated (or not) cookie jar

Insert a cookie created by generateCookie into the cookie jar (or not if it shouldn't be allowed in)

generateCookie #

Arguments

:: SetCookie

The SetCookie we are encountering

-> Request

The request that originated the response that yielded the SetCookie

-> UTCTime

Value that should be used as "now"

-> Bool

Whether or not this request is coming from an "http" source (not javascript or anything like that)

-> Maybe Cookie

The optional output cookie

Turn a SetCookie into a Cookie, if it is valid

withConnection :: Request -> Manager -> (Connection -> IO a) -> IO a #

Perform an action using a Connection acquired from the given Manager.

You should use this only when you have to read and write interactively through the connection (e.g. connection by the WebSocket protocol).

Since: http-client-0.5.13

data HistoriedResponse body #

A datatype holding information on redirected requests and the final response.

Since 0.4.1

Instances

Instances details
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 #

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

Functor HistoriedResponse 
Instance details

Defined in Network.HTTP.Client

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 #

Show body => Show (HistoriedResponse body) 
Instance details

Defined in Network.HTTP.Client

type Rep (HistoriedResponse body) 
Instance details

Defined in Network.HTTP.Client

type Rep (HistoriedResponse body) = D1 ('MetaData "HistoriedResponse" "Network.HTTP.Client" "http-client-0.7.11-FcldfJomgA7GGgEoRx20SQ" 'False) (C1 ('MetaCons "HistoriedResponse" 'PrefixI 'True) (S1 ('MetaSel ('Just "hrRedirects") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(Request, Response ByteString)]) :*: (S1 ('MetaSel ('Just "hrFinalRequest") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Request) :*: S1 ('MetaSel ('Just "hrFinalResponse") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Response body)))))

responseOpenHistory :: Request -> Manager -> IO (HistoriedResponse BodyReader) #

A variant of responseOpen which keeps a history of all redirects performed in the interim, together with the first 1024 bytes of their response bodies.

Since 0.4.1

withResponseHistory :: Request -> Manager -> (HistoriedResponse BodyReader -> IO a) -> IO a #

A variant of withResponse which keeps a history of all redirects performed in the interim, together with the first 1024 bytes of their response bodies.

Since 0.4.1

managerSetInsecureProxy :: ProxyOverride -> ManagerSettings -> ManagerSettings #

Set the proxy override value, only for HTTP (insecure) connections.

Since 0.4.7

managerSetSecureProxy :: ProxyOverride -> ManagerSettings -> ManagerSettings #

Set the proxy override value, only for HTTPS (secure) connections.

Since 0.4.7

managerSetProxy :: ProxyOverride -> ManagerSettings -> ManagerSettings #

Set the proxy override value, for both HTTP (insecure) and HTTPS (insecure) connections.

Since 0.4.7

responseTimeoutMicro :: Int -> ResponseTimeout #

Specify maximum time in microseconds the retrieval of response headers is allowed to take

Since: http-client-0.5.0

responseTimeoutNone :: ResponseTimeout #

Do not have a response timeout

Since: http-client-0.5.0

responseTimeoutDefault :: ResponseTimeout #

Use the default response timeout

When used on a Request, means: use the manager's timeout value

When used on a ManagerSettings, means: default to 30 seconds

Since: http-client-0.5.0

encodePathSegmentsRelative :: [Text] -> Builder #

Like encodePathSegments, but without the initial slash.

class Default a where #

A class for types with a default value.

Minimal complete definition

Nothing

Methods

def :: a #

The default value for this type.

Instances

Instances details
Default All 
Instance details

Defined in Data.Default.Class

Methods

def :: All #

Default Any 
Instance details

Defined in Data.Default.Class

Methods

def :: Any #

Default CClock 
Instance details

Defined in Data.Default.Class

Methods

def :: CClock #

Default CDouble 
Instance details

Defined in Data.Default.Class

Methods

def :: CDouble #

Default CFloat 
Instance details

Defined in Data.Default.Class

Methods

def :: CFloat #

Default CInt 
Instance details

Defined in Data.Default.Class

Methods

def :: CInt #

Default CIntMax 
Instance details

Defined in Data.Default.Class

Methods

def :: CIntMax #

Default CIntPtr 
Instance details

Defined in Data.Default.Class

Methods

def :: CIntPtr #

Default CLLong 
Instance details

Defined in Data.Default.Class

Methods

def :: CLLong #

Default CLong 
Instance details

Defined in Data.Default.Class

Methods

def :: CLong #

Default CPtrdiff 
Instance details

Defined in Data.Default.Class

Methods

def :: CPtrdiff #

Default CSUSeconds 
Instance details

Defined in Data.Default.Class

Methods

def :: CSUSeconds #

Default CShort 
Instance details

Defined in Data.Default.Class

Methods

def :: CShort #

Default CSigAtomic 
Instance details

Defined in Data.Default.Class

Methods

def :: CSigAtomic #

Default CSize 
Instance details

Defined in Data.Default.Class

Methods

def :: CSize #

Default CTime 
Instance details

Defined in Data.Default.Class

Methods

def :: CTime #

Default CUInt 
Instance details

Defined in Data.Default.Class

Methods

def :: CUInt #

Default CUIntMax 
Instance details

Defined in Data.Default.Class

Methods

def :: CUIntMax #

Default CUIntPtr 
Instance details

Defined in Data.Default.Class

Methods

def :: CUIntPtr #

Default CULLong 
Instance details

Defined in Data.Default.Class

Methods

def :: CULLong #

Default CULong 
Instance details

Defined in Data.Default.Class

Methods

def :: CULong #

Default CUSeconds 
Instance details

Defined in Data.Default.Class

Methods

def :: CUSeconds #

Default CUShort 
Instance details

Defined in Data.Default.Class

Methods

def :: CUShort #

Default Int16 
Instance details

Defined in Data.Default.Class

Methods

def :: Int16 #

Default Int32 
Instance details

Defined in Data.Default.Class

Methods

def :: Int32 #

Default Int64 
Instance details

Defined in Data.Default.Class

Methods

def :: Int64 #

Default Int8 
Instance details

Defined in Data.Default.Class

Methods

def :: Int8 #

Default Word16 
Instance details

Defined in Data.Default.Class

Methods

def :: Word16 #

Default Word32 
Instance details

Defined in Data.Default.Class

Methods

def :: Word32 #

Default Word64 
Instance details

Defined in Data.Default.Class

Methods

def :: Word64 #

Default SetCookie
def = defaultSetCookie
Instance details

Defined in Web.Cookie

Methods

def :: SetCookie #

Default Ordering 
Instance details

Defined in Data.Default.Class

Methods

def :: Ordering #

Default ClientHooks 
Instance details

Defined in Network.TLS.Parameters

Methods

def :: ClientHooks #

Default DebugParams 
Instance details

Defined in Network.TLS.Parameters

Methods

def :: DebugParams #

Default ServerHooks 
Instance details

Defined in Network.TLS.Parameters

Methods

def :: ServerHooks #

Default ServerParams 
Instance details

Defined in Network.TLS.Parameters

Methods

def :: ServerParams #

Default Shared 
Instance details

Defined in Network.TLS.Parameters

Methods

def :: Shared #

Default Supported 
Instance details

Defined in Network.TLS.Parameters

Methods

def :: Supported #

Default DetailedSettings 
Instance details

Defined in Network.Wai.Middleware.RequestLogger

Default RequestLoggerSettings 
Instance details

Defined in Network.Wai.Middleware.RequestLogger

Default WidgetFileSettings 
Instance details

Defined in Yesod.Default.Util

Default CombineSettings 
Instance details

Defined in Yesod.Static

Default Word8 
Instance details

Defined in Data.Default.Class

Methods

def :: Word8 #

Default Integer 
Instance details

Defined in Data.Default.Class

Methods

def :: Integer #

Default () 
Instance details

Defined in Data.Default.Class

Methods

def :: () #

Default Double 
Instance details

Defined in Data.Default.Class

Methods

def :: Double #

Default Float 
Instance details

Defined in Data.Default.Class

Methods

def :: Float #

Default Int 
Instance details

Defined in Data.Default.Class

Methods

def :: Int #

Default Word 
Instance details

Defined in Data.Default.Class

Methods

def :: Word #

(Default a, RealFloat a) => Default (Complex a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Complex a #

Default (First a) 
Instance details

Defined in Data.Default.Class

Methods

def :: First a #

Default (Last a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Last a #

Default a => Default (Dual a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Dual a #

Default (Endo a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Endo a #

Num a => Default (Product a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Product a #

Num a => Default (Sum a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Sum a #

Integral a => Default (Ratio a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Ratio a #

Default a => Default (IO a) 
Instance details

Defined in Data.Default.Class

Methods

def :: IO a #

Default (Maybe a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Maybe a #

Default [a] 
Instance details

Defined in Data.Default.Class

Methods

def :: [a] #

Default r => Default (e -> r) 
Instance details

Defined in Data.Default.Class

Methods

def :: e -> r #

(Default a, Default b) => Default (a, b) 
Instance details

Defined in Data.Default.Class

Methods

def :: (a, b) #

(Default a, Default b, Default c) => Default (a, b, c) 
Instance details

Defined in Data.Default.Class

Methods

def :: (a, b, c) #

(Default a, Default b, Default c, Default d) => Default (a, b, c, d) 
Instance details

Defined in Data.Default.Class

Methods

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

(Default a, Default b, Default c, Default d, Default e) => Default (a, b, c, d, e) 
Instance details

Defined in Data.Default.Class

Methods

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

(Default a, Default b, Default c, Default d, Default e, Default f) => Default (a, b, c, d, e, f) 
Instance details

Defined in Data.Default.Class

Methods

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

(Default a, Default b, Default c, Default d, Default e, Default f, Default g) => Default (a, b, c, d, e, f, g) 
Instance details

Defined in Data.Default.Class

Methods

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

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

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.

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.

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"

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 #

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

loadYamlSettingsArgs #

Arguments

:: FromJSON settings 
=> [Value]

any other values to use, usually from compile time config. overridden by files

-> EnvUsage

use environment variables

-> IO settings 

Same as loadYamlSettings, but get the list of runtime config files from the command line arguments.

Since: yaml-0.8.17

loadYamlSettings #

Arguments

:: FromJSON settings 
=> [FilePath]

run time config files to use, earlier files have precedence

-> [Value]

any other values to use, usually from compile time config. overridden by files

-> EnvUsage 
-> IO settings 

Load the settings from the following three sources:

  • Run time config files
  • Run time environment variables
  • The default compile time config file

For example, to load up settings from config/foo.yaml and allow overriding from the actual environment, you can use:

loadYamlSettings ["config/foo.yaml"] [] useEnv

Since: yaml-0.8.16

requireCustomEnv :: KeyMap Text -> EnvUsage #

Same as requireEnv, but instead of the actual environment, use the provided HashMap as the environment.

Since: yaml-0.8.16

useCustomEnv :: KeyMap Text -> EnvUsage #

Same as useEnv, but instead of the actual environment, use the provided HashMap as the environment.

Since: yaml-0.8.16

requireEnv :: EnvUsage #

Do not use default values from the config file, but instead take all overrides from the environment. If a value is missing, loading the file will throw an exception.

Since: yaml-0.8.16

useEnv :: EnvUsage #

Use environment variables when available, otherwise use defaults.

Since: yaml-0.8.16

ignoreEnv :: EnvUsage #

Do not use any environment variables, instead relying on defaults values in the config file.

Since: yaml-0.8.16

applyCurrentEnv #

Arguments

:: Bool

require an environment variable to be present?

-> Value 
-> IO Value 

A convenience wrapper around applyEnvValue and getCurrentEnv

Since: yaml-0.8.16

getCurrentEnv :: IO (KeyMap Text) #

Get the actual environment as a HashMap from Text to Text.

Since: yaml-0.8.16

applyEnvValue #

Arguments

:: Bool

require an environment variable to be present?

-> KeyMap Text 
-> Value 
-> Value 

Override environment variable placeholders in the given Value with values from the environment.

If the first argument is True, then all placeholders _must_ be provided by the actual environment. Otherwise, default values from the Value will be used.

Since: yaml-0.8.16

data EnvUsage #

Defines how we want to use the environment variables when loading a config file. Use the smart constructors provided by this module.

Since: yaml-0.8.16

pattern AddCookie :: !SetCookie -> Header #

pattern DeleteCookie :: !ByteString -> !ByteString -> Header #

name and path

makeYesodLogger :: LoggerSet -> IO Logger #

Create a Logger value (from yesod-core) out of a LoggerSet (from fast-logger).

develMainHelper :: IO (Settings, Application) -> IO () #

Helper for develMain in the scaffolding.

getDevSettings :: Settings -> IO Settings #

Helper for getApplicationDev in the scaffolding. Looks up PORT and DISPLAY_PORT and prints appropriate messages.

configSettingsYml :: FilePath #

Location of the default config file.

loadAppSettingsArgs #

Arguments

:: FromJSON settings 
=> [Value]

any other values to use, usually from compile time config. overridden by files

-> EnvUsage

use environment variables

-> IO settings 

Same as loadAppSettings, but get the list of runtime config files from the command line arguments.

loadAppSettings #

Arguments

:: FromJSON settings 
=> [FilePath]

run time config files to use, earlier files have precedence

-> [Value]

any other values to use, usually from compile time config. overridden by files

-> EnvUsage 
-> IO settings 

Load the settings from the following three sources:

  • Run time config files
  • Run time environment variables
  • The default compile time config file

newtype MergedValue #

Constructors

MergedValue 

Instances

Instances details
Semigroup MergedValue 
Instance details

Defined in Yesod.Default.Config2

requireAuthPair :: (YesodAuthPersist master, Typeable (AuthEntity master), MonadHandler m, HandlerSite m ~ master) => m (AuthId master, AuthEntity master) #

Similar to requireAuth, but not tied to Persistent's Entity type. Instead, the AuthId and AuthEntity are returned in a tuple.

Since: yesod-auth-1.4.0

requireAuth :: (YesodAuthPersist master, val ~ AuthEntity master, Key val ~ AuthId master, PersistEntity val, Typeable val, MonadHandler m, HandlerSite m ~ master) => m (Entity val) #

Similar to maybeAuth, but redirects to a login page if user is not authenticated or responds with error 401 if this is an API client (expecting JSON).

Since: yesod-auth-1.1.0

requireAuthId :: (MonadHandler m, YesodAuth (HandlerSite m)) => m (AuthId (HandlerSite m)) #

Similar to maybeAuthId, but redirects to a login page if user is not authenticated or responds with error 401 if this is an API client (expecting JSON).

Since: yesod-auth-1.1.0

maybeAuthPair :: (YesodAuthPersist master, Typeable (AuthEntity master), MonadHandler m, HandlerSite m ~ master) => m (Maybe (AuthId master, AuthEntity master)) #

Similar to maybeAuth, but doesn’t assume that you are using a Persistent database.

Since: yesod-auth-1.4.0

maybeAuth :: (YesodAuthPersist master, val ~ AuthEntity master, Key val ~ AuthId master, PersistEntity val, Typeable val, MonadHandler m, HandlerSite m ~ master) => m (Maybe (Entity val)) #

Similar to maybeAuthId, but additionally look up the value associated with the user's database identifier to get the value in the database. This assumes that you are using a Persistent database.

Since: yesod-auth-1.1.0

clearCreds #

Arguments

:: (MonadHandler m, YesodAuth (HandlerSite m)) 
=> Bool

if HTTP, redirect to logoutDest

-> m () 

Clears current user credentials for the session.

Since: yesod-auth-1.1.7

setCreds #

Arguments

:: (MonadHandler m, YesodAuth (HandlerSite m)) 
=> Bool

if HTTP redirects should be done

-> Creds (HandlerSite m)

new credentials

-> m () 

Sets user credentials for the session after checking them with authentication backends.

setCredsRedirect #

Arguments

:: (MonadHandler m, YesodAuth (HandlerSite m)) 
=> Creds (HandlerSite m)

new credentials

-> m TypedContent 

provideJsonMessage :: forall (m :: Type -> Type). Monad m => Text -> Writer (Endo [ProvidedRep m]) () #

loginErrorMessage :: (MonadHandler m, YesodAuth (HandlerSite m)) => Route (HandlerSite m) -> Text -> m TypedContent #

For HTML, set the message and redirect to the route. For JSON, send the message and a 401 status

defaultLoginHandler :: AuthHandler master Html #

Default handler to show the login page.

This is the default loginHandler. It concatenates plugin widgets and wraps the result in authLayout. See loginHandler for more details.

Since: yesod-auth-1.4.9

defaultMaybeAuthId :: (MonadHandler m, HandlerSite m ~ master, YesodAuthPersist master, Typeable (AuthEntity master)) => m (Maybe (AuthId master)) #

Retrieves user credentials from the session, if user is authenticated.

This function does not confirm that the credentials are valid, see maybeAuthIdRaw for more information. The first call in a request does a database request to make sure that the account is still in the database.

Since: yesod-auth-1.1.2

credsKey :: Text #

Internal session key used to hold the authentication information.

Since: yesod-auth-1.2.3

getAuth :: a -> Auth #

type MonadAuthHandler master (m :: Type -> Type) = (MonadHandler m, YesodAuth master, master ~ HandlerSite m, Auth ~ SubHandlerSite m, MonadUnliftIO m) #

type AuthHandler master a = forall (m :: Type -> Type). MonadAuthHandler master m => m a #

data AuthenticationResult master #

The result of an authentication based on credentials

Since: yesod-auth-1.4.4

Constructors

Authenticated (AuthId master)

Authenticated successfully

UserError AuthMessage

Invalid credentials provided by user

ServerError Text

Some other error

data AuthPlugin master #

Constructors

AuthPlugin 

Fields

data Creds master #

User credentials

Constructors

Creds 

Fields

Instances

Instances details
Show (Creds master) 
Instance details

Defined in Yesod.Auth

Methods

showsPrec :: Int -> Creds master -> ShowS #

show :: Creds master -> String #

showList :: [Creds master] -> ShowS #

type family AuthId master #

Instances

Instances details
type AuthId App Source # 
Instance details

Defined in BtcLsp.Yesod.Foundation

class (Yesod master, PathPiece (AuthId master), RenderMessage master FormMessage) => YesodAuth master where #

Minimal complete definition

loginDest, logoutDest, (authenticate | getAuthId), authPlugins

Associated Types

type AuthId master #

Methods

authLayout :: (MonadHandler m, HandlerSite m ~ master) => WidgetFor master () -> m Html #

specify the layout. Uses defaultLayout by default

loginDest :: master -> Route master #

Default destination on successful login, if no other destination exists.

logoutDest :: master -> Route master #

Default destination on successful logout, if no other destination exists.

authenticate :: (MonadHandler m, HandlerSite m ~ master) => Creds master -> m (AuthenticationResult master) #

Perform authentication based on the given credentials.

Default implementation is in terms of getAuthId

@since: 1.4.4

getAuthId :: (MonadHandler m, HandlerSite m ~ master) => Creds master -> m (Maybe (AuthId master)) #

Determine the ID associated with the set of credentials.

Default implementation is in terms of authenticate

authPlugins :: master -> [AuthPlugin master] #

Which authentication backends to use.

loginHandler :: AuthHandler master Html #

What to show on the login page.

By default this calls defaultLoginHandler, which concatenates plugin widgets and wraps the result in authLayout. Override if you need fancy widget containers, additional functionality, or an entirely custom page. For example, in some applications you may want to prevent the login page being displayed for a user who is already logged in, even if the URL is visited explicitly; this can be done by overriding loginHandler in your instance declaration with something like:

instance YesodAuth App where
    ...
    loginHandler = do
        ma <- lift maybeAuthId
        when (isJust ma) $
            lift $ redirect HomeR   -- or any other Handler code you want
        defaultLoginHandler

renderAuthMessage #

Arguments

:: master 
-> [Text]

languages

-> AuthMessage 
-> Text 

Used for i18n of messages provided by this package.

redirectToReferer :: master -> Bool #

After login and logout, redirect to the referring page, instead of loginDest and logoutDest. Default is False.

redirectToCurrent :: master -> Bool #

When being redirected to the login page should the current page be set to redirect back to. Default is True.

Since: yesod-auth-1.4.21

authHttpManager :: (MonadHandler m, HandlerSite m ~ master) => m Manager #

Return an HTTP connection manager that is stored in the foundation type. This allows backends to reuse persistent connections. If none of the backends you're using use HTTP connections, you can safely return error "authHttpManager" here.

onLogin :: (MonadHandler m, master ~ HandlerSite m) => m () #

Called on a successful login. By default, calls addMessageI "success" NowLoggedIn.

onLogout :: (MonadHandler m, master ~ HandlerSite m) => m () #

Called on logout. By default, does nothing

maybeAuthId :: (MonadHandler m, master ~ HandlerSite m) => m (Maybe (AuthId master)) #

Retrieves user credentials, if user is authenticated.

By default, this calls defaultMaybeAuthId to get the user ID from the session. This can be overridden to allow authentication via other means, such as checking for a special token in a request header. This is especially useful for creating an API to be accessed via some means other than a browser.

Since: yesod-auth-1.2.0

onErrorHtml :: (MonadHandler m, HandlerSite m ~ master) => Route master -> Text -> m Html #

Called on login error for HTTP requests. By default, calls addMessage with "error" as status and redirects to dest.

runHttpRequest :: (MonadHandler m, HandlerSite m ~ master, MonadUnliftIO m) => Request -> (Response BodyReader -> m a) -> m a #

runHttpRequest gives you a chance to handle an HttpException and retry The default behavior is to simply execute the request which will throw an exception on failure

The HTTP Request is given in case it is useful to change behavior based on inspecting the request. This is an experimental API that is not broadly used throughout the yesod-auth code base

type family AuthEntity master #

If the AuthId for a given site is a persistent ID, this will give the value for that entity. E.g.:

type AuthId MySite = UserId
AuthEntity MySite ~ User

Since: yesod-auth-1.2.0

Instances

Instances details
type AuthEntity App Source # 
Instance details

Defined in BtcLsp.Yesod.Foundation

type AuthEntity App = KeyEntity (AuthId App)

class (YesodAuth master, YesodPersist master) => YesodAuthPersist master where #

Class which states that the given site is an instance of YesodAuth and that its AuthId is a lookup key for the full user information in a YesodPersist database.

The default implementation of getAuthEntity assumes that the AuthId for the YesodAuth superclass is in fact a persistent Key for the given value. This is the common case in Yesod, and means that you can easily look up the full information on a given user.

Since: yesod-auth-1.4.0

Minimal complete definition

Nothing

Associated Types

type AuthEntity master #

If the AuthId for a given site is a persistent ID, this will give the value for that entity. E.g.:

type AuthId MySite = UserId
AuthEntity MySite ~ User

Since: yesod-auth-1.2.0

type AuthEntity master = KeyEntity (AuthId master)

Methods

getAuthEntity :: (MonadHandler m, HandlerSite m ~ master) => AuthId master -> m (Maybe (AuthEntity master)) #

Instances

Instances details
YesodAuthPersist App Source # 
Instance details

Defined in BtcLsp.Yesod.Foundation

Associated Types

type AuthEntity App #

data Auth #

Instances

Instances details
ParseRoute Auth 
Instance details

Defined in Yesod.Auth.Routes

Methods

parseRoute :: ([Text], [(Text, Text)]) -> Maybe (Route Auth) #

RenderRoute Auth 
Instance details

Defined in Yesod.Auth.Routes

Associated Types

data Route Auth #

Methods

renderRoute :: Route Auth -> ([Text], [(Text, Text)]) #

RouteAttrs Auth 
Instance details

Defined in Yesod.Auth.Routes

Methods

routeAttrs :: Route Auth -> Set Text #

Read (Route Auth) 
Instance details

Defined in Yesod.Auth.Routes

Show (Route Auth) 
Instance details

Defined in Yesod.Auth.Routes

Eq (Route Auth) 
Instance details

Defined in Yesod.Auth.Routes

Methods

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

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

data Route Auth 
Instance details

Defined in Yesod.Auth.Routes

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 #

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

inspect :: Out a => a -> Text #

inspectGenPlain :: (Out a, IsString b) => a -> b #

inspectPlain :: Out a => a -> Text #

inspectStr :: Out a => a -> String #

data Table Source #

Instances

Instances details
Bounded Table Source # 
Instance details

Defined in BtcLsp.Data.Kind

Enum Table Source # 
Instance details

Defined in BtcLsp.Data.Kind

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 #

Show Table Source # 
Instance details

Defined in BtcLsp.Data.Kind

Methods

showsPrec :: Int -> Table -> ShowS #

show :: Table -> String #

showList :: [Table] -> ShowS #

Eq Table Source # 
Instance details

Defined in BtcLsp.Data.Kind

Methods

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

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

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 #

type Rep Table Source # 
Instance details

Defined in BtcLsp.Data.Kind

type Rep Table = D1 ('MetaData "Table" "BtcLsp.Data.Kind" "btc-lsp-0.1.0.0-inplace" 'False) ((C1 ('MetaCons "UserTable" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "SwapIntoLnTable" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "SwapUtxoTable" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "BlockTable" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LnChanTable" 'PrefixI 'False) (U1 :: Type -> Type))))

data Owner Source #

Constructors

Lsp 
Usr 
Chan 

Instances

Instances details
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 #

Show Owner Source # 
Instance details

Defined in BtcLsp.Data.Kind

Methods

showsPrec :: Int -> Owner -> ShowS #

show :: Owner -> String #

showList :: [Owner] -> ShowS #

Eq Owner Source # 
Instance details

Defined in BtcLsp.Data.Kind

Methods

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

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

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 #

type Rep Owner Source # 
Instance details

Defined in BtcLsp.Data.Kind

type Rep Owner = D1 ('MetaData "Owner" "BtcLsp.Data.Kind" "btc-lsp-0.1.0.0-inplace" 'False) (C1 ('MetaCons "Lsp" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Usr" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Chan" 'PrefixI 'False) (U1 :: Type -> Type)))

data BitcoinLayer Source #

Constructors

OnChain 
Ln 

Instances

Instances details
Generic BitcoinLayer Source # 
Instance details

Defined in BtcLsp.Data.Kind

Associated Types

type Rep BitcoinLayer :: Type -> Type #

Show BitcoinLayer Source # 
Instance details

Defined in BtcLsp.Data.Kind

Eq BitcoinLayer Source # 
Instance details

Defined in BtcLsp.Data.Kind

Ord BitcoinLayer Source # 
Instance details

Defined in BtcLsp.Data.Kind

type Rep BitcoinLayer Source # 
Instance details

Defined in BtcLsp.Data.Kind

type Rep BitcoinLayer = D1 ('MetaData "BitcoinLayer" "BtcLsp.Data.Kind" "btc-lsp-0.1.0.0-inplace" 'False) (C1 ('MetaCons "OnChain" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Ln" 'PrefixI 'False) (U1 :: Type -> Type))

data MoneyRelation Source #

Constructors

Fund 
Refund 
Gain 
Loss 

Instances

Instances details
Generic MoneyRelation Source # 
Instance details

Defined in BtcLsp.Data.Kind

Associated Types

type Rep MoneyRelation :: Type -> Type #

Show MoneyRelation Source # 
Instance details

Defined in BtcLsp.Data.Kind

Eq MoneyRelation Source # 
Instance details

Defined in BtcLsp.Data.Kind

Ord MoneyRelation Source # 
Instance details

Defined in BtcLsp.Data.Kind

type Rep MoneyRelation Source # 
Instance details

Defined in BtcLsp.Data.Kind

type Rep MoneyRelation = D1 ('MetaData "MoneyRelation" "BtcLsp.Data.Kind" "btc-lsp-0.1.0.0-inplace" 'False) ((C1 ('MetaCons "Fund" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Refund" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Gain" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Loss" 'PrefixI 'False) (U1 :: Type -> Type)))

data Direction Source #

Constructors

Outgoing 
Incoming 

Instances

Instances details
Generic Direction Source # 
Instance details

Defined in BtcLsp.Data.Kind

Associated Types

type Rep Direction :: Type -> Type #

Show Direction Source # 
Instance details

Defined in BtcLsp.Data.Kind

Eq Direction Source # 
Instance details

Defined in BtcLsp.Data.Kind

Ord Direction Source # 
Instance details

Defined in BtcLsp.Data.Kind

type Rep Direction Source # 
Instance details

Defined in BtcLsp.Data.Kind

type Rep Direction = D1 ('MetaData "Direction" "BtcLsp.Data.Kind" "btc-lsp-0.1.0.0-inplace" 'False) (C1 ('MetaCons "Outgoing" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Incoming" 'PrefixI 'False) (U1 :: Type -> Type))

class HasTable a where Source #

Methods

getTable :: Key a -> Table Source #

Instances

Instances details
HasTable Block Source # 
Instance details

Defined in BtcLsp.Storage.Model

HasTable LnChan Source # 
Instance details

Defined in BtcLsp.Storage.Model

HasTable SwapIntoLn Source # 
Instance details

Defined in BtcLsp.Storage.Model

HasTable User Source # 
Instance details

Defined in BtcLsp.Storage.Model

Methods

getTable :: Key User -> Table Source #

class MonadUnliftIO m => Storage m where Source #

Instances

Instances details
MonadUnliftIO m => Storage (AppM m) Source # 
Instance details

Defined in BtcLsp.Data.AppM

data PsbtUtxo Source #

Constructors

PsbtUtxo 

Fields

Instances

Instances details
Out PsbtUtxo Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

docPrec :: Int -> PsbtUtxo -> Doc #

doc :: PsbtUtxo -> Doc #

docList :: [PsbtUtxo] -> Doc #

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 #

Show PsbtUtxo Source # 
Instance details

Defined in BtcLsp.Data.Type

type Rep PsbtUtxo Source # 
Instance details

Defined in BtcLsp.Data.Type

type Rep PsbtUtxo = D1 ('MetaData "PsbtUtxo" "BtcLsp.Data.Type" "btc-lsp-0.1.0.0-inplace" 'False) (C1 ('MetaCons "PsbtUtxo" 'PrefixI 'True) (S1 ('MetaSel ('Just "getOutPoint") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 OutPoint) :*: (S1 ('MetaSel ('Just "getAmt") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 MSat) :*: S1 ('MetaSel ('Just "getLockId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Maybe UtxoLockId)))))

newtype RowQty Source #

Constructors

RowQty 

Fields

Instances

Instances details
Out RowQty Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

docPrec :: Int -> RowQty -> Doc #

doc :: RowQty -> Doc #

docList :: [RowQty] -> Doc #

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 #

Show RowQty 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 #

Ord RowQty Source # 
Instance details

Defined in BtcLsp.Data.Type

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

From Int RowQty Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Int -> RowQty

type Rep RowQty Source # 
Instance details

Defined in BtcLsp.Data.Type

type Rep RowQty = D1 ('MetaData "RowQty" "BtcLsp.Data.Type" "btc-lsp-0.1.0.0-inplace" 'True) (C1 ('MetaCons "RowQty" 'PrefixI 'True) (S1 ('MetaSel ('Just "unRowQty") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int64)))

newtype Vbyte Source #

Constructors

Vbyte 

Fields

Instances

Instances details
Out Vbyte Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

docPrec :: Int -> Vbyte -> Doc #

doc :: Vbyte -> Doc #

docList :: [Vbyte] -> Doc #

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 #

Num Vbyte 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 #

Eq Vbyte Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

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

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

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 #

From Vbyte (Ratio Natural) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Vbyte -> Ratio Natural

From (Ratio Natural) Vbyte Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Ratio Natural -> Vbyte

type Rep Vbyte Source # 
Instance details

Defined in BtcLsp.Data.Type

type Rep Vbyte = D1 ('MetaData "Vbyte" "BtcLsp.Data.Type" "btc-lsp-0.1.0.0-inplace" 'True) (C1 ('MetaCons "Vbyte" 'PrefixI 'True) (S1 ('MetaSel ('Just "unVbyte") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Ratio Natural))))

data Uuid (tab :: Table) Source #

Instances

Instances details
SymbolToField "uuid" SwapIntoLn (Uuid 'SwapIntoLnTable) Source # 
Instance details

Defined in BtcLsp.Storage.Model

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 #

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 #

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

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 #

Eq (Uuid tab) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

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

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

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 #

PathPiece (Uuid tab) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

fromPathPiece :: Text -> Maybe (Uuid tab) #

toPathPiece :: Uuid tab -> Text #

PersistField (Uuid tab) Source # 
Instance details

Defined in BtcLsp.Data.Type

PersistFieldSql (Uuid tab) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

sqlType :: Proxy (Uuid tab) -> SqlType #

ToMessage (Uuid tab) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

toMessage :: Uuid tab -> Text #

type Rep (Uuid tab) Source # 
Instance details

Defined in BtcLsp.Data.Type

type Rep (Uuid tab) = D1 ('MetaData "Uuid" "BtcLsp.Data.Type" "btc-lsp-0.1.0.0-inplace" 'True) (C1 ('MetaCons "Uuid" 'PrefixI 'True) (S1 ('MetaSel ('Just "unUuid'") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UUID)))

newtype RHashHex Source #

Constructors

RHashHex 

Fields

Instances

Instances details
Out RHashHex Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

docPrec :: Int -> RHashHex -> Doc #

doc :: RHashHex -> Doc #

docList :: [RHashHex] -> Doc #

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 #

Read RHashHex Source # 
Instance details

Defined in BtcLsp.Data.Type

Show RHashHex Source # 
Instance details

Defined in BtcLsp.Data.Type

Eq RHashHex Source # 
Instance details

Defined in BtcLsp.Data.Type

Ord RHashHex Source # 
Instance details

Defined in BtcLsp.Data.Type

PathPiece RHashHex Source # 
Instance details

Defined in BtcLsp.Data.Type

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 RHash RHashHex Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: RHash -> RHashHex

From Text RHashHex Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Text -> RHashHex

type Rep RHashHex Source # 
Instance details

Defined in BtcLsp.Data.Type

type Rep RHashHex = D1 ('MetaData "RHashHex" "BtcLsp.Data.Type" "btc-lsp-0.1.0.0-inplace" 'True) (C1 ('MetaCons "RHashHex" 'PrefixI 'True) (S1 ('MetaSel ('Just "unRHashHex") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

newtype NodeUriHex Source #

Constructors

NodeUriHex Text 

Instances

Instances details
Out NodeUriHex Source # 
Instance details

Defined in BtcLsp.Data.Type

IsString NodeUriHex Source # 
Instance details

Defined in BtcLsp.Data.Type

Generic NodeUriHex Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep NodeUriHex :: Type -> Type #

Read NodeUriHex Source # 
Instance details

Defined in BtcLsp.Data.Type

Show NodeUriHex Source # 
Instance details

Defined in BtcLsp.Data.Type

Eq NodeUriHex Source # 
Instance details

Defined in BtcLsp.Data.Type

Ord NodeUriHex Source # 
Instance details

Defined in BtcLsp.Data.Type

From NodeUriHex Text Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: NodeUriHex -> Text

From Text NodeUriHex Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Text -> NodeUriHex

TryFrom NodeUri NodeUriHex Source # 
Instance details

Defined in BtcLsp.Data.Type

type Rep NodeUriHex Source # 
Instance details

Defined in BtcLsp.Data.Type

type Rep NodeUriHex = D1 ('MetaData "NodeUriHex" "BtcLsp.Data.Type" "btc-lsp-0.1.0.0-inplace" 'True) (C1 ('MetaCons "NodeUriHex" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

data NodeUri Source #

Instances

Instances details
Out NodeUri Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

docPrec :: Int -> NodeUri -> Doc #

doc :: NodeUri -> Doc #

docList :: [NodeUri] -> Doc #

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 #

Show NodeUri 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 #

Ord NodeUri Source # 
Instance details

Defined in BtcLsp.Data.Type

TryFrom NodeUri NodeUriHex Source # 
Instance details

Defined in BtcLsp.Data.Type

type Rep NodeUri Source # 
Instance details

Defined in BtcLsp.Data.Type

type Rep NodeUri = D1 ('MetaData "NodeUri" "BtcLsp.Data.Type" "btc-lsp-0.1.0.0-inplace" 'False) (C1 ('MetaCons "NodeUri" 'PrefixI 'True) (S1 ('MetaSel ('Just "nodeUriPubKey") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 NodePubKey) :*: S1 ('MetaSel ('Just "nodeUriSocketAddress") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 SocketAddress)))

newtype UtxoLockId Source #

Constructors

UtxoLockId ByteString 

Instances

Instances details
Out UtxoLockId Source # 
Instance details

Defined in BtcLsp.Data.Type

Generic UtxoLockId Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep UtxoLockId :: Type -> Type #

Read UtxoLockId Source # 
Instance details

Defined in BtcLsp.Data.Type

Show UtxoLockId Source # 
Instance details

Defined in BtcLsp.Data.Type

Eq UtxoLockId Source # 
Instance details

Defined in BtcLsp.Data.Type

Ord UtxoLockId Source # 
Instance details

Defined in BtcLsp.Data.Type

PersistField UtxoLockId Source # 
Instance details

Defined in BtcLsp.Data.Type

PersistFieldSql UtxoLockId Source # 
Instance details

Defined in BtcLsp.Data.Type

SymbolToField "lockId" SwapUtxo (Maybe UtxoLockId) Source # 
Instance details

Defined in BtcLsp.Storage.Model

type Rep UtxoLockId Source # 
Instance details

Defined in BtcLsp.Data.Type

type Rep UtxoLockId = D1 ('MetaData "UtxoLockId" "BtcLsp.Data.Type" "btc-lsp-0.1.0.0-inplace" 'True) (C1 ('MetaCons "UtxoLockId" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ByteString)))

newtype NodePubKeyHex Source #

Constructors

NodePubKeyHex Text 

Instances

Instances details
Out NodePubKeyHex Source # 
Instance details

Defined in BtcLsp.Data.Type

IsString NodePubKeyHex Source # 
Instance details

Defined in BtcLsp.Data.Type

Generic NodePubKeyHex Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep NodePubKeyHex :: Type -> Type #

Read NodePubKeyHex Source # 
Instance details

Defined in BtcLsp.Data.Type

Show NodePubKeyHex Source # 
Instance details

Defined in BtcLsp.Data.Type

Eq NodePubKeyHex Source # 
Instance details

Defined in BtcLsp.Data.Type

Ord NodePubKeyHex Source # 
Instance details

Defined in BtcLsp.Data.Type

From NodePubKeyHex Text Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: NodePubKeyHex -> Text

From Text NodePubKeyHex Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Text -> NodePubKeyHex

TryFrom NodePubKey NodePubKeyHex Source # 
Instance details

Defined in BtcLsp.Data.Type

type Rep NodePubKeyHex Source # 
Instance details

Defined in BtcLsp.Data.Type

type Rep NodePubKeyHex = D1 ('MetaData "NodePubKeyHex" "BtcLsp.Data.Type" "btc-lsp-0.1.0.0-inplace" 'True) (C1 ('MetaCons "NodePubKeyHex" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

data Privacy Source #

Constructors

Public 
Private 

Instances

Instances details
Out Privacy Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

docPrec :: Int -> Privacy -> Doc #

doc :: Privacy -> Doc #

docList :: [Privacy] -> Doc #

Bounded Privacy Source # 
Instance details

Defined in BtcLsp.Data.Type

Enum Privacy Source # 
Instance details

Defined in BtcLsp.Data.Type

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 #

Read Privacy Source # 
Instance details

Defined in BtcLsp.Data.Type

Show Privacy Source # 
Instance details

Defined in BtcLsp.Data.Type

Eq Privacy Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

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

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

Ord Privacy Source # 
Instance details

Defined in BtcLsp.Data.Type

PersistField Privacy Source # 
Instance details

Defined in BtcLsp.Data.Type

PersistFieldSql Privacy Source # 
Instance details

Defined in BtcLsp.Data.Type

From Privacy Privacy Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

Methods

from :: Privacy0 -> Privacy

From Privacy Privacy Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

Methods

from :: Privacy -> Privacy0

SymbolToField "privacy" SwapIntoLn Privacy Source # 
Instance details

Defined in BtcLsp.Storage.Model

type Rep Privacy Source # 
Instance details

Defined in BtcLsp.Data.Type

type Rep Privacy = D1 ('MetaData "Privacy" "BtcLsp.Data.Type" "btc-lsp-0.1.0.0-inplace" 'False) (C1 ('MetaCons "Public" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Private" 'PrefixI 'False) (U1 :: Type -> Type))

data SwapUtxoStatus Source #

Instances

Instances details
Out SwapUtxoStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Generic SwapUtxoStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep SwapUtxoStatus :: Type -> Type #

Read SwapUtxoStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Show SwapUtxoStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Eq SwapUtxoStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Ord SwapUtxoStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

PersistField SwapUtxoStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

PersistFieldSql SwapUtxoStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

SymbolToField "status" SwapUtxo SwapUtxoStatus Source # 
Instance details

Defined in BtcLsp.Storage.Model

type Rep SwapUtxoStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

type Rep SwapUtxoStatus = D1 ('MetaData "SwapUtxoStatus" "BtcLsp.Data.Type" "btc-lsp-0.1.0.0-inplace" 'False) ((C1 ('MetaCons "SwapUtxoUnspent" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "SwapUtxoUnspentDust" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "SwapUtxoUnspentChanReserve" 'PrefixI 'False) (U1 :: Type -> Type))) :+: (C1 ('MetaCons "SwapUtxoSpentChanSwapped" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "SwapUtxoSpentRefund" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "SwapUtxoOrphan" 'PrefixI 'False) (U1 :: Type -> Type))))

data BlkStatus Source #

Constructors

BlkConfirmed 
BlkOrphan 

Instances

Instances details
Out BlkStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

docPrec :: Int -> BlkStatus -> Doc #

doc :: BlkStatus -> Doc #

docList :: [BlkStatus] -> Doc #

Generic BlkStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep BlkStatus :: Type -> Type #

Read BlkStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Show BlkStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Eq BlkStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Ord BlkStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

PersistField BlkStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

PersistFieldSql BlkStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

SymbolToField "status" Block BlkStatus Source # 
Instance details

Defined in BtcLsp.Storage.Model

type Rep BlkStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

type Rep BlkStatus = D1 ('MetaData "BlkStatus" "BtcLsp.Data.Type" "btc-lsp-0.1.0.0-inplace" 'False) (C1 ('MetaCons "BlkConfirmed" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "BlkOrphan" 'PrefixI 'False) (U1 :: Type -> Type))

newtype BlkHeight Source #

Constructors

BlkHeight Word64 

Instances

Instances details
Out BlkHeight Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

docPrec :: Int -> BlkHeight -> Doc #

doc :: BlkHeight -> Doc #

docList :: [BlkHeight] -> Doc #

ToJSON BlkHeight Source # 
Instance details

Defined in BtcLsp.Data.Type

Generic BlkHeight Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep BlkHeight :: Type -> Type #

Num BlkHeight Source # 
Instance details

Defined in BtcLsp.Data.Type

Show BlkHeight Source # 
Instance details

Defined in BtcLsp.Data.Type

Eq BlkHeight Source # 
Instance details

Defined in BtcLsp.Data.Type

Ord BlkHeight Source # 
Instance details

Defined in BtcLsp.Data.Type

PersistField BlkHeight Source # 
Instance details

Defined in BtcLsp.Data.Type

PersistFieldSql BlkHeight Source # 
Instance details

Defined in BtcLsp.Data.Type

From Word64 BlkHeight Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Word64 -> BlkHeight

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

TryFrom BlockHeight BlkHeight Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

tryFrom :: BlockHeight -> Either (TryFromException BlockHeight BlkHeight) BlkHeight

SymbolToField "height" Block BlkHeight Source # 
Instance details

Defined in BtcLsp.Storage.Model

type Rep BlkHeight Source # 
Instance details

Defined in BtcLsp.Data.Type

type Rep BlkHeight = D1 ('MetaData "BlkHeight" "BtcLsp.Data.Type" "btc-lsp-0.1.0.0-inplace" 'True) (C1 ('MetaCons "BlkHeight" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word64)))

newtype BlkHash Source #

Constructors

BlkHash BlockHash 

Instances

Instances details
Out BlkHash Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

docPrec :: Int -> BlkHash -> Doc #

doc :: BlkHash -> Doc #

docList :: [BlkHash] -> Doc #

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 #

Show BlkHash Source # 
Instance details

Defined in BtcLsp.Data.Type

Eq BlkHash Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

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

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

Ord BlkHash Source # 
Instance details

Defined in BtcLsp.Data.Type

PersistField BlkHash Source # 
Instance details

Defined in BtcLsp.Data.Type

PersistFieldSql BlkHash Source # 
Instance details

Defined in BtcLsp.Data.Type

From BlkHash BlockHash Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: BlkHash -> BlockHash

From BlockHash BlkHash Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: BlockHash -> BlkHash

SymbolToField "hash" Block BlkHash Source # 
Instance details

Defined in BtcLsp.Storage.Model

type Rep BlkHash Source # 
Instance details

Defined in BtcLsp.Data.Type

type Rep BlkHash = D1 ('MetaData "BlkHash" "BtcLsp.Data.Type" "btc-lsp-0.1.0.0-inplace" 'True) (C1 ('MetaCons "BlkHash" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 BlockHash)))

data SocketAddress Source #

Instances

Instances details
Out SocketAddress Source # 
Instance details

Defined in BtcLsp.Data.Type

Generic SocketAddress Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep SocketAddress :: Type -> Type #

Show SocketAddress Source # 
Instance details

Defined in BtcLsp.Data.Type

Eq SocketAddress Source # 
Instance details

Defined in BtcLsp.Data.Type

Ord SocketAddress Source # 
Instance details

Defined in BtcLsp.Data.Type

type Rep SocketAddress Source # 
Instance details

Defined in BtcLsp.Data.Type

type Rep SocketAddress = D1 ('MetaData "SocketAddress" "BtcLsp.Data.Type" "btc-lsp-0.1.0.0-inplace" 'False) (C1 ('MetaCons "SocketAddress" 'PrefixI 'True) (S1 ('MetaSel ('Just "socketAddressHost") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 HostName) :*: S1 ('MetaSel ('Just "socketAddressPort") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 PortNumber)))

data FailureInternal Source #

Instances

Instances details
Out FailureInternal Source # 
Instance details

Defined in BtcLsp.Data.Type

Generic FailureInternal Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep FailureInternal :: Type -> Type #

Show FailureInternal Source # 
Instance details

Defined in BtcLsp.Data.Type

Eq FailureInternal Source # 
Instance details

Defined in BtcLsp.Data.Type

type Rep FailureInternal Source # 
Instance details

Defined in BtcLsp.Data.Type

data FailureInput Source #

Instances

Instances details
Out FailureInput Source # 
Instance details

Defined in BtcLsp.Data.Type

Generic FailureInput Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep FailureInput :: Type -> Type #

Show FailureInput Source # 
Instance details

Defined in BtcLsp.Data.Type

Eq FailureInput Source # 
Instance details

Defined in BtcLsp.Data.Type

type Rep FailureInput Source # 
Instance details

Defined in BtcLsp.Data.Type

type Rep FailureInput = D1 ('MetaData "FailureInput" "BtcLsp.Data.Type" "btc-lsp-0.1.0.0-inplace" 'False) (C1 ('MetaCons "FailureNonce" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "FailureNonSegwitAddr" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "FailureNonValidAddr" 'PrefixI 'False) (U1 :: Type -> Type)))

data Failure Source #

Instances

Instances details
Out Failure Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

docPrec :: Int -> Failure -> Doc #

doc :: Failure -> Doc #

docList :: [Failure] -> Doc #

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 #

Show Failure 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 #

type Rep Failure Source # 
Instance details

Defined in BtcLsp.Data.Type

data SwapStatus Source #

Constructors

SwapWaitingFundChain

Waiting on-chain funding trx with given amt from user with some confirmations.

SwapWaitingPeer

Swap has been funded on-chain, need to open LN channel now.

SwapWaitingChan

Waiting channel opening trx to be mined with some confirmations.

SwapSucceeded

Final statuses

SwapExpired 

Instances

Instances details
Out SwapStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Bounded SwapStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Enum SwapStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Generic SwapStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep SwapStatus :: Type -> Type #

Read SwapStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Show SwapStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Eq SwapStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Ord SwapStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

PathPiece SwapStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

PersistField SwapStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

PersistFieldSql SwapStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

SymbolToField "status" SwapIntoLn SwapStatus Source # 
Instance details

Defined in BtcLsp.Storage.Model

type Rep SwapStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

type Rep SwapStatus = D1 ('MetaData "SwapStatus" "BtcLsp.Data.Type" "btc-lsp-0.1.0.0-inplace" 'False) ((C1 ('MetaCons "SwapWaitingFundChain" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "SwapWaitingPeer" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "SwapWaitingChan" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "SwapSucceeded" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "SwapExpired" 'PrefixI 'False) (U1 :: Type -> Type))))

newtype UnsafeOnChainAddress (mrel :: MoneyRelation) Source #

Instances

Instances details
From RefundOnChainAddress (UnsafeOnChainAddress 'Refund) Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

From OnChainAddress (UnsafeOnChainAddress 'Refund) Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

From Text (UnsafeOnChainAddress mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Text -> UnsafeOnChainAddress mrel

Out (UnsafeOnChainAddress mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Generic (UnsafeOnChainAddress mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep (UnsafeOnChainAddress mrel) :: Type -> Type #

Read (UnsafeOnChainAddress mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Show (UnsafeOnChainAddress mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Eq (UnsafeOnChainAddress mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Ord (UnsafeOnChainAddress mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

PathPiece (UnsafeOnChainAddress mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

PersistField (UnsafeOnChainAddress mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

PersistFieldSql (UnsafeOnChainAddress mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

From (UnsafeOnChainAddress mrel) Text Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: UnsafeOnChainAddress mrel -> Text

type Rep (UnsafeOnChainAddress mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

type Rep (UnsafeOnChainAddress mrel) = D1 ('MetaData "UnsafeOnChainAddress" "BtcLsp.Data.Type" "btc-lsp-0.1.0.0-inplace" 'True) (C1 ('MetaCons "UnsafeOnChainAddress" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

newtype FeeRate Source #

Constructors

FeeRate (Ratio Word64) 

Instances

Instances details
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 #

Show FeeRate 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 #

Ord FeeRate Source # 
Instance details

Defined in BtcLsp.Data.Type

ToMessage FeeRate Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

toMessage :: FeeRate -> Text #

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

TryFrom Rational FeeRate Source # 
Instance details

Defined in BtcLsp.Data.Type

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 (Ratio Word64) FeeRate Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Ratio Word64 -> FeeRate

type Rep FeeRate Source # 
Instance details

Defined in BtcLsp.Data.Type

type Rep FeeRate = D1 ('MetaData "FeeRate" "BtcLsp.Data.Type" "btc-lsp-0.1.0.0-inplace" 'True) (C1 ('MetaCons "FeeRate" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Ratio Word64))))

newtype Money (owner :: Owner) (btcl :: BitcoinLayer) (mrel :: MoneyRelation) Source #

Constructors

Money 

Fields

Instances

Instances details
SymbolToField "amount" SwapUtxo (Money 'Usr 'OnChain 'Fund) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "chanCapLsp" SwapIntoLn (Money 'Lsp 'Ln 'Fund) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "chanCapUser" SwapIntoLn (Money 'Usr 'Ln 'Fund) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "feeLsp" SwapIntoLn (Money 'Lsp 'OnChain 'Gain) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "feeMiner" SwapIntoLn (Money 'Lsp 'OnChain 'Loss) Source # 
Instance details

Defined in BtcLsp.Storage.Model

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

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)

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)

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 #

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 #

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 #

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

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 #

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 #

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 #

PersistField (Money owner btcl mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

toPersistValue :: Money owner btcl mrel -> PersistValue #

fromPersistValue :: PersistValue -> Either Text (Money owner btcl mrel) #

PersistFieldSql (Money owner btcl mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

sqlType :: Proxy (Money owner btcl mrel) -> SqlType #

ToMessage (Money owner btcl mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

toMessage :: Money owner btcl 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

type Rep (Money owner btcl mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

type Rep (Money owner btcl mrel) = D1 ('MetaData "Money" "BtcLsp.Data.Type" "btc-lsp-0.1.0.0-inplace" 'True) (C1 ('MetaCons "Money" 'PrefixI 'True) (S1 ('MetaSel ('Just "unMoney") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MSat)))

newtype Liquidity (dir :: Direction) Source #

Constructors

Liquidity 

Fields

Instances

Instances details
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 #

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 #

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 #

Read (Liquidity dir) Source # 
Instance details

Defined in BtcLsp.Data.Type

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 #

Eq (Liquidity dir) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

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

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

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 #

type Rep (Liquidity dir) Source # 
Instance details

Defined in BtcLsp.Data.Type

type Rep (Liquidity dir) = D1 ('MetaData "Liquidity" "BtcLsp.Data.Type" "btc-lsp-0.1.0.0-inplace" 'True) (C1 ('MetaCons "Liquidity" 'PrefixI 'True) (S1 ('MetaSel ('Just "unLiquidity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MSat)))

data LnChanStatus Source #

Instances

Instances details
Out LnChanStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Generic LnChanStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep LnChanStatus :: Type -> Type #

Read LnChanStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Show LnChanStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Eq LnChanStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Ord LnChanStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

PersistField LnChanStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

PersistFieldSql LnChanStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

SymbolToField "status" LnChan LnChanStatus Source # 
Instance details

Defined in BtcLsp.Storage.Model

type Rep LnChanStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

type Rep LnChanStatus = D1 ('MetaData "LnChanStatus" "BtcLsp.Data.Type" "btc-lsp-0.1.0.0-inplace" 'False) ((C1 ('MetaCons "LnChanStatusPendingOpen" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "LnChanStatusOpened" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LnChanStatusActive" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "LnChanStatusFullyResolved" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LnChanStatusInactive" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "LnChanStatusPendingClose" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LnChanStatusClosed" 'PrefixI 'False) (U1 :: Type -> Type))))

data LnInvoiceStatus Source #

Instances

Instances details
Out LnInvoiceStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Generic LnInvoiceStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep LnInvoiceStatus :: Type -> Type #

Read LnInvoiceStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Show LnInvoiceStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

Eq LnInvoiceStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

PersistField LnInvoiceStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

PersistFieldSql LnInvoiceStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

type Rep LnInvoiceStatus Source # 
Instance details

Defined in BtcLsp.Data.Type

type Rep LnInvoiceStatus = D1 ('MetaData "LnInvoiceStatus" "BtcLsp.Data.Type" "btc-lsp-0.1.0.0-inplace" 'False) ((C1 ('MetaCons "LnInvoiceStatusNew" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LnInvoiceStatusLocked" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "LnInvoiceStatusSettled" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "LnInvoiceStatusCancelled" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LnInvoiceStatusExpired" 'PrefixI 'False) (U1 :: Type -> Type))))

newtype SwapHash Source #

Constructors

SwapHash Text 

Instances

Instances details
Out SwapHash Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

docPrec :: Int -> SwapHash -> Doc #

doc :: SwapHash -> Doc #

docList :: [SwapHash] -> Doc #

ToJSON SwapHash Source # 
Instance details

Defined in BtcLsp.Data.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 #

Read SwapHash Source # 
Instance details

Defined in BtcLsp.Data.Type

Show SwapHash Source # 
Instance details

Defined in BtcLsp.Data.Type

Eq SwapHash Source # 
Instance details

Defined in BtcLsp.Data.Type

PathPiece SwapHash Source # 
Instance details

Defined in BtcLsp.Data.Type

ToJavascript SwapHash Source # 
Instance details

Defined in BtcLsp.Data.Type

ToContent (Maybe SwapHash) Source # 
Instance details

Defined in BtcLsp.Data.Type

ToTypedContent (Maybe SwapHash) Source # 
Instance details

Defined in BtcLsp.Data.Type

type Rep SwapHash Source # 
Instance details

Defined in BtcLsp.Data.Type

type Rep SwapHash = D1 ('MetaData "SwapHash" "BtcLsp.Data.Type" "btc-lsp-0.1.0.0-inplace" 'True) (C1 ('MetaCons "SwapHash" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

newtype LnInvoice (mrel :: MoneyRelation) Source #

Constructors

LnInvoice PaymentRequest 

Instances

Instances details
From FundLnInvoice (LnInvoice 'Fund) 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 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

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 #

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 #

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 #

Eq (LnInvoice mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

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

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

PathPiece (LnInvoice mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

fromPathPiece :: Text -> Maybe (LnInvoice mrel) #

toPathPiece :: LnInvoice mrel -> Text #

PersistField (LnInvoice mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

PersistFieldSql (LnInvoice mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

sqlType :: Proxy (LnInvoice mrel) -> SqlType #

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

type Rep (LnInvoice mrel) Source # 
Instance details

Defined in BtcLsp.Data.Type

type Rep (LnInvoice mrel) = D1 ('MetaData "LnInvoice" "BtcLsp.Data.Type" "btc-lsp-0.1.0.0-inplace" 'True) (C1 ('MetaCons "LnInvoice" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PaymentRequest)))

newtype MicroSeconds Source #

Constructors

MicroSeconds Integer 

Instances

Instances details
Out MicroSeconds Source # 
Instance details

Defined in BtcLsp.Data.Type

Generic MicroSeconds Source # 
Instance details

Defined in BtcLsp.Data.Type

Associated Types

type Rep MicroSeconds :: Type -> Type #

Num MicroSeconds Source # 
Instance details

Defined in BtcLsp.Data.Type

Show MicroSeconds Source # 
Instance details

Defined in BtcLsp.Data.Type

Eq MicroSeconds Source # 
Instance details

Defined in BtcLsp.Data.Type

Ord MicroSeconds Source # 
Instance details

Defined in BtcLsp.Data.Type

type Rep MicroSeconds Source # 
Instance details

Defined in BtcLsp.Data.Type

type Rep MicroSeconds = D1 ('MetaData "MicroSeconds" "BtcLsp.Data.Type" "btc-lsp-0.1.0.0-inplace" 'True) (C1 ('MetaCons "MicroSeconds" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Integer)))

newtype Seconds Source #

Constructors

Seconds Word64 

Instances

Instances details
Out Seconds Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

docPrec :: Int -> Seconds -> Doc #

doc :: Seconds -> Doc #

docList :: [Seconds] -> Doc #

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 #

Num Seconds Source # 
Instance details

Defined in BtcLsp.Data.Type

Show Seconds Source # 
Instance details

Defined in BtcLsp.Data.Type

Eq Seconds Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

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

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

Ord Seconds Source # 
Instance details

Defined in BtcLsp.Data.Type

type Rep Seconds Source # 
Instance details

Defined in BtcLsp.Data.Type

type Rep Seconds = D1 ('MetaData "Seconds" "BtcLsp.Data.Type" "btc-lsp-0.1.0.0-inplace" 'True) (C1 ('MetaCons "Seconds" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word64)))

data YesodLog Source #

Instances

Instances details
FromJSON YesodLog Source # 
Instance details

Defined in BtcLsp.Data.Type

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 #

Read YesodLog Source # 
Instance details

Defined in BtcLsp.Data.Type

Show YesodLog Source # 
Instance details

Defined in BtcLsp.Data.Type

Eq YesodLog Source # 
Instance details

Defined in BtcLsp.Data.Type

Ord YesodLog Source # 
Instance details

Defined in BtcLsp.Data.Type

type Rep YesodLog Source # 
Instance details

Defined in BtcLsp.Data.Type

type Rep YesodLog = D1 ('MetaData "YesodLog" "BtcLsp.Data.Type" "btc-lsp-0.1.0.0-inplace" 'False) (C1 ('MetaCons "YesodLogAll" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "YesodLogNoMain" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "YesodLogNothing" 'PrefixI 'False) (U1 :: Type -> Type)))

data LogFormat Source #

Constructors

Bracket 
JSON 

Instances

Instances details
Read LogFormat Source # 
Instance details

Defined in BtcLsp.Data.Type

data Nonce Source #

Instances

Instances details
Out Nonce Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

docPrec :: Int -> Nonce -> Doc #

doc :: Nonce -> Doc #

docList :: [Nonce] -> Doc #

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 #

Read Nonce 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 #

Eq Nonce Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

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

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

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 #

PersistField Nonce Source # 
Instance details

Defined in BtcLsp.Data.Type

PersistFieldSql Nonce Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

sqlType :: Proxy Nonce -> SqlType #

From Word64 Nonce Source # 
Instance details

Defined in BtcLsp.Data.Type

Methods

from :: Word64 -> Nonce

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 Nonce Nonce Source # 
Instance details

Defined in BtcLsp.Grpc.Orphan

Methods

from :: Nonce -> Nonce0

SymbolToField "latestNonce" User Nonce Source # 
Instance details

Defined in BtcLsp.Storage.Model

type Rep Nonce Source # 
Instance details

Defined in BtcLsp.Data.Type

type Rep Nonce = D1 ('MetaData "Nonce" "BtcLsp.Data.Type" "btc-lsp-0.1.0.0-inplace" 'True) (C1 ('MetaCons "Nonce" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word64)))

tryFailureE :: forall source target. (Show source, Typeable source, Typeable target) => Text -> Either (TryFromException source target) target -> Either Failure target Source #

tryFailureT :: forall source target m. (Show source, Typeable source, Typeable target, Monad m) => Text -> Either (TryFromException source target) target -> ExceptT Failure m target Source #

tryFromE :: forall source target. (Show source, Typeable source, Typeable target, TryFrom source target, 'False ~ (source == target)) => Text -> source -> Either Failure target Source #

tryFromT :: forall source target m. (Show source, Typeable source, Typeable target, TryFrom source target, Monad m, 'False ~ (source == target)) => Text -> source -> ExceptT Failure m target Source #

unUuid :: Uuid tab -> UUID Source #

newUuid :: MonadIO m => m (Uuid tab) Source #

data AppSettings Source #

Runtime settings to configure this application. These settings can be loaded from various sources: defaults, environment variables, config files, theoretically even a database.

Constructors

AppSettings 

Fields

Instances

Instances details
FromJSON AppSettings Source # 
Instance details

Defined in BtcLsp.Yesod.Settings

widgetFileSettings :: WidgetFileSettings Source #

Settings for widgetFile, such as which template languages to support and default Hamlet settings.

For more information on modifying behavior, see:

https://github.com/yesodweb/yesod/wiki/Overriding-widgetFile

combineSettings :: CombineSettings Source #

How static files should be combined.

configSettingsYmlBS :: ByteString Source #

Raw bytes at compile time of config/settings.yml

configSettingsYmlValue :: Value Source #

config/settings.yml, parsed to a Value.

compileTimeAppSettings :: AppSettings Source #

A version of AppSettings parsed at compile time from config/settings.yml.

monitorTotalOnChainLiquidity :: Env m => WalletBalance -> m () Source #

withBtcT :: Env m => (Client -> a) -> (a -> IO b) -> ExceptT Failure m b Source #

withBtc :: Env m => (Client -> a) -> (a -> IO b) -> m (Either Failure b) Source #

withLndServerT :: (Env m, GrpcRes res failure specific) => (LndEnv -> a) -> (a -> m (Either LndError b)) -> ExceptT res m b Source #

withLndT :: Env m => (LndEnv -> a) -> (a -> m (Either LndError b)) -> ExceptT Failure m b Source #

setGrpcCtxT :: (Env m, HasField msg "ctx" Ctx) => msg -> ExceptT Failure m msg Source #

setGrpcCtx :: (Env m, HasField msg "ctx" Ctx) => msg -> m msg Source #

withLnd :: Env m => (LndEnv -> a) -> (a -> m (Either LndError b)) -> m (Either Failure b) Source #

getLspLndEnv :: Env m => m LndEnv Source #

data LnChan Source #

Instances

Instances details
Out LnChan Source # 
Instance details

Defined in BtcLsp.Storage.Model

Methods

docPrec :: Int -> LnChan -> Doc #

doc :: LnChan -> Doc #

docList :: [LnChan] -> Doc #

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 #

Show LnChan Source # 
Instance details

Defined in BtcLsp.Storage.Model

HasTable LnChan Source # 
Instance details

Defined in BtcLsp.Storage.Model

Eq LnChan Source # 
Instance details

Defined in BtcLsp.Storage.Model

Methods

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

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

Ord LnChan Source # 
Instance details

Defined in BtcLsp.Storage.Model

PersistEntity LnChan Source # 
Instance details

Defined in BtcLsp.Storage.Model

Associated Types

type PersistEntityBackend LnChan #

data Key LnChan #

data EntityField LnChan :: Type -> Type #

data Unique LnChan #

PersistField LnChan Source # 
Instance details

Defined in BtcLsp.Storage.Model

AtLeastOneUniqueKey LnChan Source # 
Instance details

Defined in BtcLsp.Storage.Model

OnlyOneUniqueKey LnChan Source # 
Instance details

Defined in BtcLsp.Storage.Model

PersistFieldSql LnChan Source # 
Instance details

Defined in BtcLsp.Storage.Model

ToBackendKey SqlBackend LnChan Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "insertedAt" LnChan UTCTime Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "status" LnChan LnChanStatus Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "totalSatoshisReceived" LnChan MSat Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "totalSatoshisSent" LnChan MSat Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "transactedAt" LnChan UTCTime Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "updatedAt" LnChan UTCTime Source # 
Instance details

Defined in BtcLsp.Storage.Model

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 "fundingTxId" LnChan (TxId 'Funding) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "fundingVout" LnChan (Vout 'Funding) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "id" LnChan (Key LnChan) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "swapIntoLnId" LnChan (Maybe SwapIntoLnId) Source # 
Instance details

Defined in BtcLsp.Storage.Model

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 #

FromJSON (Key LnChan) Source # 
Instance details

Defined in BtcLsp.Storage.Model

ToJSON (Key LnChan) Source # 
Instance details

Defined in BtcLsp.Storage.Model

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 #

Read (Key LnChan) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Show (Key LnChan) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Colored (Entity LnChan) Source # 
Instance details

Defined in BtcLsp.Yesod.Data.Colored

Eq (Key LnChan) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Methods

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

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

Ord (Key LnChan) Source # 
Instance details

Defined in BtcLsp.Storage.Model

FromHttpApiData (Key LnChan) Source # 
Instance details

Defined in BtcLsp.Storage.Model

ToHttpApiData (Key LnChan) Source # 
Instance details

Defined in BtcLsp.Storage.Model

PathPiece (Key LnChan) Source # 
Instance details

Defined in BtcLsp.Storage.Model

PersistField (Key LnChan) Source # 
Instance details

Defined in BtcLsp.Storage.Model

PersistFieldSql (Key LnChan) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Methods

sqlType :: Proxy (Key LnChan) -> SqlType #

type Rep LnChan Source # 
Instance details

Defined in BtcLsp.Storage.Model

type Rep LnChan = D1 ('MetaData "LnChan" "BtcLsp.Storage.Model" "btc-lsp-0.1.0.0-inplace" 'False) (C1 ('MetaCons "LnChan" 'PrefixI 'True) (((S1 ('MetaSel ('Just "lnChanSwapIntoLnId") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe SwapIntoLnId)) :*: (S1 ('MetaSel ('Just "lnChanFundingTxId") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (TxId 'Funding)) :*: S1 ('MetaSel ('Just "lnChanFundingVout") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Vout 'Funding)))) :*: (S1 ('MetaSel ('Just "lnChanClosingTxId") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe (TxId 'Closing))) :*: (S1 ('MetaSel ('Just "lnChanExtId") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe ChanId)) :*: S1 ('MetaSel ('Just "lnChanBak") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe SingleChanBackupBlob))))) :*: ((S1 ('MetaSel ('Just "lnChanTotalSatoshisSent") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 MSat) :*: (S1 ('MetaSel ('Just "lnChanTotalSatoshisReceived") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 MSat) :*: S1 ('MetaSel ('Just "lnChanStatus") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 LnChanStatus))) :*: (S1 ('MetaSel ('Just "lnChanInsertedAt") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 UTCTime) :*: (S1 ('MetaSel ('Just "lnChanUpdatedAt") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 UTCTime) :*: S1 ('MetaSel ('Just "lnChanTransactedAt") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 UTCTime))))))
data EntityField LnChan typ Source # 
Instance details

Defined in BtcLsp.Storage.Model

newtype Key LnChan Source # 
Instance details

Defined in BtcLsp.Storage.Model

type PersistEntityBackend LnChan Source # 
Instance details

Defined in BtcLsp.Storage.Model

data Unique LnChan Source # 
Instance details

Defined in BtcLsp.Storage.Model

type Rep (Key LnChan) Source # 
Instance details

Defined in BtcLsp.Storage.Model

type Rep (Key LnChan) = D1 ('MetaData "Key" "BtcLsp.Storage.Model" "btc-lsp-0.1.0.0-inplace" 'True) (C1 ('MetaCons "LnChanKey" 'PrefixI 'True) (S1 ('MetaSel ('Just "unLnChanKey") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (BackendKey SqlBackend))))

data Block Source #

Instances

Instances details
Out Block Source # 
Instance details

Defined in BtcLsp.Storage.Model

Methods

docPrec :: Int -> Block -> Doc #

doc :: Block -> Doc #

docList :: [Block] -> Doc #

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 #

Show Block Source # 
Instance details

Defined in BtcLsp.Storage.Model

Methods

showsPrec :: Int -> Block -> ShowS #

show :: Block -> String #

showList :: [Block] -> ShowS #

HasTable Block Source # 
Instance details

Defined in BtcLsp.Storage.Model

Eq Block Source # 
Instance details

Defined in BtcLsp.Storage.Model

Methods

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

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

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 #

PersistEntity Block Source # 
Instance details

Defined in BtcLsp.Storage.Model

Associated Types

type PersistEntityBackend Block #

data Key Block #

data EntityField Block :: Type -> Type #

data Unique Block #

PersistField Block Source # 
Instance details

Defined in BtcLsp.Storage.Model

AtLeastOneUniqueKey Block Source # 
Instance details

Defined in BtcLsp.Storage.Model

OnlyOneUniqueKey Block Source # 
Instance details

Defined in BtcLsp.Storage.Model

PersistFieldSql Block Source # 
Instance details

Defined in BtcLsp.Storage.Model

Methods

sqlType :: Proxy Block -> SqlType #

ToBackendKey SqlBackend Block Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "blockId" SwapUtxo BlockId Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "hash" Block BlkHash Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "height" Block BlkHeight Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "insertedAt" Block UTCTime Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "status" Block BlkStatus Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "updatedAt" Block UTCTime Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "id" Block (Key Block) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "refundBlockId" SwapUtxo (Maybe BlockId) Source # 
Instance details

Defined in BtcLsp.Storage.Model

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 #

FromJSON (Key Block) Source # 
Instance details

Defined in BtcLsp.Storage.Model

ToJSON (Key Block) Source # 
Instance details

Defined in BtcLsp.Storage.Model

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 #

Read (Key Block) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Show (Key Block) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Eq (Key Block) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Methods

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

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

Ord (Key Block) Source # 
Instance details

Defined in BtcLsp.Storage.Model

FromHttpApiData (Key Block) Source # 
Instance details

Defined in BtcLsp.Storage.Model

ToHttpApiData (Key Block) Source # 
Instance details

Defined in BtcLsp.Storage.Model

PathPiece (Key Block) Source # 
Instance details

Defined in BtcLsp.Storage.Model

PersistField (Key Block) Source # 
Instance details

Defined in BtcLsp.Storage.Model

PersistFieldSql (Key Block) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Methods

sqlType :: Proxy (Key Block) -> SqlType #

type Rep Block Source # 
Instance details

Defined in BtcLsp.Storage.Model

type Rep Block = D1 ('MetaData "Block" "BtcLsp.Storage.Model" "btc-lsp-0.1.0.0-inplace" 'False) (C1 ('MetaCons "Block" 'PrefixI 'True) ((S1 ('MetaSel ('Just "blockHeight") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 BlkHeight) :*: S1 ('MetaSel ('Just "blockHash") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 BlkHash)) :*: (S1 ('MetaSel ('Just "blockStatus") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 BlkStatus) :*: (S1 ('MetaSel ('Just "blockInsertedAt") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 UTCTime) :*: S1 ('MetaSel ('Just "blockUpdatedAt") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 UTCTime)))))
data EntityField Block typ Source # 
Instance details

Defined in BtcLsp.Storage.Model

newtype Key Block Source # 
Instance details

Defined in BtcLsp.Storage.Model

type PersistEntityBackend Block Source # 
Instance details

Defined in BtcLsp.Storage.Model

data Unique Block Source # 
Instance details

Defined in BtcLsp.Storage.Model

type Rep (Key Block) Source # 
Instance details

Defined in BtcLsp.Storage.Model

type Rep (Key Block) = D1 ('MetaData "Key" "BtcLsp.Storage.Model" "btc-lsp-0.1.0.0-inplace" 'True) (C1 ('MetaCons "BlockKey" 'PrefixI 'True) (S1 ('MetaSel ('Just "unBlockKey") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (BackendKey SqlBackend))))

data SwapUtxo Source #

Instances

Instances details
Out SwapUtxo Source # 
Instance details

Defined in BtcLsp.Storage.Model

Methods

docPrec :: Int -> SwapUtxo -> Doc #

doc :: SwapUtxo -> Doc #

docList :: [SwapUtxo] -> Doc #

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 #

Show SwapUtxo Source # 
Instance details

Defined in BtcLsp.Storage.Model

Eq SwapUtxo Source # 
Instance details

Defined in BtcLsp.Storage.Model

Ord SwapUtxo Source # 
Instance details

Defined in BtcLsp.Storage.Model

PersistEntity SwapUtxo Source # 
Instance details

Defined in BtcLsp.Storage.Model

PersistField SwapUtxo Source # 
Instance details

Defined in BtcLsp.Storage.Model

AtLeastOneUniqueKey SwapUtxo Source # 
Instance details

Defined in BtcLsp.Storage.Model

OnlyOneUniqueKey SwapUtxo Source # 
Instance details

Defined in BtcLsp.Storage.Model

PersistFieldSql SwapUtxo Source # 
Instance details

Defined in BtcLsp.Storage.Model

ToBackendKey SqlBackend SwapUtxo Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "blockId" SwapUtxo BlockId Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "insertedAt" SwapUtxo UTCTime Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "status" SwapUtxo SwapUtxoStatus Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "swapIntoLnId" SwapUtxo SwapIntoLnId Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "updatedAt" SwapUtxo UTCTime Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "id" SwapUtxo (Key SwapUtxo) 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 "txid" SwapUtxo (TxId 'Funding) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "vout" SwapUtxo (Vout 'Funding) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "amount" SwapUtxo (Money 'Usr 'OnChain 'Fund) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Out (Key SwapUtxo) Source # 
Instance details

Defined in BtcLsp.Storage.Model

FromJSON (Key SwapUtxo) Source # 
Instance details

Defined in BtcLsp.Storage.Model

ToJSON (Key SwapUtxo) Source # 
Instance details

Defined in BtcLsp.Storage.Model

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 #

Read (Key SwapUtxo) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Show (Key SwapUtxo) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Eq (Key SwapUtxo) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Ord (Key SwapUtxo) Source # 
Instance details

Defined in BtcLsp.Storage.Model

FromHttpApiData (Key SwapUtxo) Source # 
Instance details

Defined in BtcLsp.Storage.Model

ToHttpApiData (Key SwapUtxo) Source # 
Instance details

Defined in BtcLsp.Storage.Model

PathPiece (Key SwapUtxo) Source # 
Instance details

Defined in BtcLsp.Storage.Model

PersistField (Key SwapUtxo) Source # 
Instance details

Defined in BtcLsp.Storage.Model

PersistFieldSql (Key SwapUtxo) Source # 
Instance details

Defined in BtcLsp.Storage.Model

type Rep SwapUtxo Source # 
Instance details

Defined in BtcLsp.Storage.Model

data EntityField SwapUtxo typ Source # 
Instance details

Defined in BtcLsp.Storage.Model

newtype Key SwapUtxo Source # 
Instance details

Defined in BtcLsp.Storage.Model

type PersistEntityBackend SwapUtxo Source # 
Instance details

Defined in BtcLsp.Storage.Model

data Unique SwapUtxo Source # 
Instance details

Defined in BtcLsp.Storage.Model

type Rep (Key SwapUtxo) Source # 
Instance details

Defined in BtcLsp.Storage.Model

type Rep (Key SwapUtxo) = D1 ('MetaData "Key" "BtcLsp.Storage.Model" "btc-lsp-0.1.0.0-inplace" 'True) (C1 ('MetaCons "SwapUtxoKey" 'PrefixI 'True) (S1 ('MetaSel ('Just "unSwapUtxoKey") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (BackendKey SqlBackend))))

data SwapIntoLn Source #

Instances

Instances details
Out SwapIntoLn Source # 
Instance details

Defined in BtcLsp.Storage.Model

Generic SwapIntoLn Source # 
Instance details

Defined in BtcLsp.Storage.Model

Associated Types

type Rep SwapIntoLn :: Type -> Type #

Show SwapIntoLn Source # 
Instance details

Defined in BtcLsp.Storage.Model

HasTable SwapIntoLn Source # 
Instance details

Defined in BtcLsp.Storage.Model

Eq SwapIntoLn Source # 
Instance details

Defined in BtcLsp.Storage.Model

PersistEntity SwapIntoLn Source # 
Instance details

Defined in BtcLsp.Storage.Model

PersistField SwapIntoLn Source # 
Instance details

Defined in BtcLsp.Storage.Model

AtLeastOneUniqueKey SwapIntoLn Source # 
Instance details

Defined in BtcLsp.Storage.Model

(TypeError (MultipleUniqueKeysError SwapIntoLn) :: Constraint) => OnlyOneUniqueKey SwapIntoLn Source # 
Instance details

Defined in BtcLsp.Storage.Model

PersistFieldSql SwapIntoLn Source # 
Instance details

Defined in BtcLsp.Storage.Model

ToBackendKey SqlBackend SwapIntoLn Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "expiresAt" SwapIntoLn UTCTime Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "insertedAt" SwapIntoLn UTCTime Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "privacy" SwapIntoLn Privacy Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "status" SwapIntoLn SwapStatus Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "swapIntoLnId" SwapUtxo SwapIntoLnId Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "updatedAt" SwapIntoLn UTCTime Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "userId" SwapIntoLn UserId Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "fundAddress" SwapIntoLn (OnChainAddress 'Fund) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "id" SwapIntoLn (Key SwapIntoLn) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "lspFeeAndChangeAddress" SwapIntoLn (OnChainAddress 'Gain) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "refundAddress" SwapIntoLn (OnChainAddress 'Refund) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "swapIntoLnId" LnChan (Maybe SwapIntoLnId) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "uuid" SwapIntoLn (Uuid 'SwapIntoLnTable) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "chanCapLsp" SwapIntoLn (Money 'Lsp 'Ln 'Fund) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "chanCapUser" SwapIntoLn (Money 'Usr 'Ln 'Fund) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "feeLsp" SwapIntoLn (Money 'Lsp 'OnChain 'Gain) Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "feeMiner" SwapIntoLn (Money 'Lsp 'OnChain 'Loss) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Out (Key SwapIntoLn) Source # 
Instance details

Defined in BtcLsp.Storage.Model

FromJSON (Key SwapIntoLn) Source # 
Instance details

Defined in BtcLsp.Storage.Model

ToJSON (Key SwapIntoLn) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Generic (Key SwapIntoLn) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Associated Types

type Rep (Key SwapIntoLn) :: Type -> Type #

Read (Key SwapIntoLn) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Show (Key SwapIntoLn) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Eq (Key SwapIntoLn) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Ord (Key SwapIntoLn) Source # 
Instance details

Defined in BtcLsp.Storage.Model

FromHttpApiData (Key SwapIntoLn) Source # 
Instance details

Defined in BtcLsp.Storage.Model

ToHttpApiData (Key SwapIntoLn) Source # 
Instance details

Defined in BtcLsp.Storage.Model

PathPiece (Key SwapIntoLn) Source # 
Instance details

Defined in BtcLsp.Storage.Model

PersistField (Key SwapIntoLn) Source # 
Instance details

Defined in BtcLsp.Storage.Model

PersistFieldSql (Key SwapIntoLn) Source # 
Instance details

Defined in BtcLsp.Storage.Model

type Rep SwapIntoLn Source # 
Instance details

Defined in BtcLsp.Storage.Model

type Rep SwapIntoLn = D1 ('MetaData "SwapIntoLn" "BtcLsp.Storage.Model" "btc-lsp-0.1.0.0-inplace" 'False) (C1 ('MetaCons "SwapIntoLn" 'PrefixI 'True) (((S1 ('MetaSel ('Just "swapIntoLnUuid") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Uuid 'SwapIntoLnTable)) :*: (S1 ('MetaSel ('Just "swapIntoLnUserId") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 UserId) :*: S1 ('MetaSel ('Just "swapIntoLnFundAddress") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (OnChainAddress 'Fund)))) :*: ((S1 ('MetaSel ('Just "swapIntoLnLspFeeAndChangeAddress") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (OnChainAddress 'Gain)) :*: S1 ('MetaSel ('Just "swapIntoLnRefundAddress") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (OnChainAddress 'Refund))) :*: (S1 ('MetaSel ('Just "swapIntoLnChanCapUser") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Money 'Usr 'Ln 'Fund)) :*: S1 ('MetaSel ('Just "swapIntoLnChanCapLsp") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Money 'Lsp 'Ln 'Fund))))) :*: ((S1 ('MetaSel ('Just "swapIntoLnFeeLsp") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Money 'Lsp 'OnChain 'Gain)) :*: (S1 ('MetaSel ('Just "swapIntoLnFeeMiner") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Money 'Lsp 'OnChain 'Loss)) :*: S1 ('MetaSel ('Just "swapIntoLnStatus") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SwapStatus))) :*: ((S1 ('MetaSel ('Just "swapIntoLnPrivacy") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Privacy) :*: S1 ('MetaSel ('Just "swapIntoLnExpiresAt") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 UTCTime)) :*: (S1 ('MetaSel ('Just "swapIntoLnInsertedAt") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 UTCTime) :*: S1 ('MetaSel ('Just "swapIntoLnUpdatedAt") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 UTCTime))))))
data EntityField SwapIntoLn typ Source # 
Instance details

Defined in BtcLsp.Storage.Model

newtype Key SwapIntoLn Source # 
Instance details

Defined in BtcLsp.Storage.Model

type PersistEntityBackend SwapIntoLn Source # 
Instance details

Defined in BtcLsp.Storage.Model

data Unique SwapIntoLn Source # 
Instance details

Defined in BtcLsp.Storage.Model

type Rep (Key SwapIntoLn) Source # 
Instance details

Defined in BtcLsp.Storage.Model

type Rep (Key SwapIntoLn) = D1 ('MetaData "Key" "BtcLsp.Storage.Model" "btc-lsp-0.1.0.0-inplace" 'True) (C1 ('MetaCons "SwapIntoLnKey" 'PrefixI 'True) (S1 ('MetaSel ('Just "unSwapIntoLnKey") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (BackendKey SqlBackend))))

data User Source #

Instances

Instances details
Out User Source # 
Instance details

Defined in BtcLsp.Storage.Model

Methods

docPrec :: Int -> User -> Doc #

doc :: User -> Doc #

docList :: [User] -> Doc #

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 #

Show User Source # 
Instance details

Defined in BtcLsp.Storage.Model

Methods

showsPrec :: Int -> User -> ShowS #

show :: User -> String #

showList :: [User] -> ShowS #

HasTable User Source # 
Instance details

Defined in BtcLsp.Storage.Model

Methods

getTable :: Key User -> Table Source #

Eq User Source # 
Instance details

Defined in BtcLsp.Storage.Model

Methods

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

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

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 #

PersistEntity User Source # 
Instance details

Defined in BtcLsp.Storage.Model

Associated Types

type PersistEntityBackend User #

data Key User #

data EntityField User :: Type -> Type #

data Unique User #

PersistField User Source # 
Instance details

Defined in BtcLsp.Storage.Model

AtLeastOneUniqueKey User Source # 
Instance details

Defined in BtcLsp.Storage.Model

OnlyOneUniqueKey User Source # 
Instance details

Defined in BtcLsp.Storage.Model

PersistFieldSql User Source # 
Instance details

Defined in BtcLsp.Storage.Model

Methods

sqlType :: Proxy User -> SqlType #

ToBackendKey SqlBackend User Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "insertedAt" User UTCTime Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "latestNonce" User Nonce Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "nodePubKey" User NodePubKey Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "updatedAt" User UTCTime Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "userId" SwapIntoLn UserId Source # 
Instance details

Defined in BtcLsp.Storage.Model

SymbolToField "id" User (Key User) 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 #

FromJSON (Key User) Source # 
Instance details

Defined in BtcLsp.Storage.Model

ToJSON (Key User) Source # 
Instance details

Defined in BtcLsp.Storage.Model

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 #

Read (Key User) 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 #

Eq (Key User) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Methods

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

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

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 #

FromHttpApiData (Key User) Source # 
Instance details

Defined in BtcLsp.Storage.Model

ToHttpApiData (Key User) Source # 
Instance details

Defined in BtcLsp.Storage.Model

PathPiece (Key User) Source # 
Instance details

Defined in BtcLsp.Storage.Model

PersistField (Key User) Source # 
Instance details

Defined in BtcLsp.Storage.Model

PersistFieldSql (Key User) Source # 
Instance details

Defined in BtcLsp.Storage.Model

Methods

sqlType :: Proxy (Key User) -> SqlType #

type Rep User Source # 
Instance details

Defined in BtcLsp.Storage.Model

type Rep User = D1 ('MetaData "User" "BtcLsp.Storage.Model" "btc-lsp-0.1.0.0-inplace" 'False) (C1 ('MetaCons "User" 'PrefixI 'True) ((S1 ('MetaSel ('Just "userNodePubKey") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 NodePubKey) :*: S1 ('MetaSel ('Just "userLatestNonce") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Nonce)) :*: (S1 ('MetaSel ('Just "userInsertedAt") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 UTCTime) :*: S1 ('MetaSel ('Just "userUpdatedAt") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 UTCTime))))
data EntityField User typ Source # 
Instance details

Defined in BtcLsp.Storage.Model

newtype Key User Source # 
Instance details

Defined in BtcLsp.Storage.Model

type PersistEntityBackend User Source # 
Instance details

Defined in BtcLsp.Storage.Model

data Unique User Source # 
Instance details

Defined in BtcLsp.Storage.Model

type Rep (Key User) Source # 
Instance details

Defined in BtcLsp.Storage.Model

type Rep (Key User) = D1 ('MetaData "Key" "BtcLsp.Storage.Model" "btc-lsp-0.1.0.0-inplace" 'True) (C1 ('MetaCons "UserKey" 'PrefixI 'True) (S1 ('MetaSel ('Just "unUserKey") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (BackendKey SqlBackend))))