Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
BtcLsp.Data.Type
Documentation
Instances
Out Nonce Source # | |
Generic Nonce Source # | |
Read Nonce Source # | |
Show Nonce Source # | |
Eq Nonce Source # | |
Ord Nonce Source # | |
PersistField Nonce Source # | |
Defined in BtcLsp.Data.Type Methods toPersistValue :: Nonce -> PersistValue # fromPersistValue :: PersistValue -> Either Text Nonce # | |
PersistFieldSql Nonce Source # | |
From Word64 Nonce Source # | |
Defined in BtcLsp.Data.Type | |
From Nonce Word64 Source # | |
Defined in BtcLsp.Data.Type | |
From Nonce Nonce Source # | |
Defined in BtcLsp.Grpc.Orphan | |
From Nonce Nonce Source # | |
Defined in BtcLsp.Grpc.Orphan | |
SymbolToField "latestNonce" User Nonce Source # | |
Defined in BtcLsp.Storage.Model Methods | |
type Rep Nonce Source # | |
Defined in BtcLsp.Data.Type |
newtype LnInvoice (mrel :: MoneyRelation) Source #
Constructors
LnInvoice PaymentRequest |
Instances
data LnInvoiceStatus Source #
Constructors
LnInvoiceStatusNew | |
LnInvoiceStatusLocked | |
LnInvoiceStatusSettled | |
LnInvoiceStatusCancelled | |
LnInvoiceStatusExpired |
Instances
data LnChanStatus Source #
Constructors
LnChanStatusPendingOpen | |
LnChanStatusOpened | |
LnChanStatusActive | |
LnChanStatusFullyResolved | |
LnChanStatusInactive | |
LnChanStatusPendingClose | |
LnChanStatusClosed |
Instances
newtype Liquidity (dir :: Direction) Source #
Constructors
Liquidity | |
Fields
|
Instances
Out (Liquidity dir) Source # | |
Generic (Liquidity dir) Source # | |
Num (Liquidity dir) Source # | |
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 # | |
Show (Liquidity dir) Source # | |
Eq (Liquidity dir) Source # | |
Ord (Liquidity dir) Source # | |
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 # | |
type Rep (Liquidity dir) Source # | |
Defined in BtcLsp.Data.Type |
newtype Money (owner :: Owner) (btcl :: BitcoinLayer) (mrel :: MoneyRelation) Source #
Instances
SymbolToField "amount" SwapUtxo (Money 'Usr 'OnChain 'Fund) Source # | |
Defined in BtcLsp.Storage.Model Methods symbolToField :: EntityField SwapUtxo (Money 'Usr 'OnChain 'Fund) # | |
SymbolToField "chanCapLsp" SwapIntoLn (Money 'Lsp 'Ln 'Fund) Source # | |
Defined in BtcLsp.Storage.Model Methods symbolToField :: EntityField SwapIntoLn (Money 'Lsp 'Ln 'Fund) # | |
SymbolToField "chanCapUser" SwapIntoLn (Money 'Usr 'Ln 'Fund) Source # | |
Defined in BtcLsp.Storage.Model Methods symbolToField :: EntityField SwapIntoLn (Money 'Usr 'Ln 'Fund) # | |
SymbolToField "feeLsp" SwapIntoLn (Money 'Lsp 'OnChain 'Gain) Source # | |
Defined in BtcLsp.Storage.Model Methods symbolToField :: EntityField SwapIntoLn (Money 'Lsp 'OnChain 'Gain) # | |
SymbolToField "feeMiner" SwapIntoLn (Money 'Lsp 'OnChain 'Loss) Source # | |
Defined in BtcLsp.Storage.Model Methods symbolToField :: EntityField SwapIntoLn (Money 'Lsp 'OnChain 'Loss) # | |
From Word64 (Money owner btcl mrel) Source # | |
Defined in BtcLsp.Data.Type | |
From MSat (Money owner btcl mrel) Source # | |
Defined in BtcLsp.Data.Type | |
TryFrom Rational (Money owner btcl mrel) Source # | |
Defined in BtcLsp.Data.Type | |
TryFrom Natural (Money owner btcl mrel) Source # | |
Defined in BtcLsp.Data.Type | |
TryFrom (Ratio Natural) (Money owner btcl mrel) Source # | |
Defined in BtcLsp.Data.Type | |
Out (Money owner btcl mrel) Source # | |
Generic (Money owner btcl mrel) Source # | |
Num (Money owner btcl mrel) Source # | |
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 # | |
Show (Money owner btcl mrel) Source # | |
Eq (Money owner btcl mrel) Source # | |
Ord (Money owner btcl mrel) Source # | |
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 # | |
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 # | |
ToMessage (Money owner btcl mrel) Source # | |
Defined in BtcLsp.Data.Type | |
From (Money 'Lsp btcl 'Gain) FeeMoney Source # | |
From (Money 'Usr btcl 'Fund) LocalBalance Source # | |
Defined in BtcLsp.Grpc.Orphan Methods from :: Money 'Usr btcl 'Fund -> LocalBalance | |
From (Money owner btcl mrel) Rational Source # | |
Defined in BtcLsp.Data.Type | |
From (Money owner btcl mrel) Word64 Source # | |
Defined in BtcLsp.Data.Type | |
From (Money owner btcl mrel) Msat Source # | |
Defined in BtcLsp.Grpc.Orphan | |
From (Money owner btcl mrel) MSat Source # | |
Defined in BtcLsp.Data.Type | |
From (Money owner btcl mrel) Natural Source # | |
Defined in BtcLsp.Data.Type | |
From (Money owner btcl mrel) (Ratio Natural) Source # | |
Defined in BtcLsp.Data.Type | |
type Rep (Money owner btcl mrel) Source # | |
Defined in BtcLsp.Data.Type |
Instances
Generic FeeRate Source # | |
Show FeeRate Source # | |
Eq FeeRate Source # | |
Ord FeeRate Source # | |
ToMessage FeeRate Source # | |
Defined in BtcLsp.Data.Type | |
From FeeRate Rational Source # | |
Defined in BtcLsp.Data.Type | |
From FeeRate FeeRate Source # | |
Defined in BtcLsp.Grpc.Orphan | |
From FeeRate Urational Source # | |
Defined in BtcLsp.Grpc.Orphan | |
TryFrom Rational FeeRate Source # | |
Defined in BtcLsp.Data.Type | |
From FeeRate (Ratio Word64) Source # | |
Defined in BtcLsp.Data.Type | |
From FeeRate (Ratio Natural) Source # | |
Defined in BtcLsp.Data.Type | |
From (Ratio Word64) FeeRate Source # | |
Defined in BtcLsp.Data.Type | |
type Rep FeeRate Source # | |
newtype UnsafeOnChainAddress (mrel :: MoneyRelation) Source #
Constructors
UnsafeOnChainAddress Text |
Instances
Constructors
YesodLogAll | |
YesodLogNoMain | |
YesodLogNothing |
Instances
FromJSON YesodLog Source # | |
Generic YesodLog Source # | |
Read YesodLog Source # | |
Show YesodLog Source # | |
Eq YesodLog Source # | |
Ord YesodLog Source # | |
Defined in BtcLsp.Data.Type | |
type Rep YesodLog Source # | |
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))) |
newtype MicroSeconds Source #
Constructors
MicroSeconds Integer |
Instances
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
swapStatusChain :: [SwapStatus] Source #
swapStatusLn :: [SwapStatus] Source #
swapStatusFinal :: [SwapStatus] Source #
Constructors
FailureInp FailureInput | |
FailureInt FailureInternal |
Instances
Out Failure Source # | |
Generic Failure Source # | |
Show Failure Source # | |
Eq Failure Source # | |
type Rep Failure Source # | |
Defined in BtcLsp.Data.Type type Rep Failure = D1 ('MetaData "Failure" "BtcLsp.Data.Type" "btc-lsp-0.1.0.0-inplace" 'False) (C1 ('MetaCons "FailureInp" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 FailureInput)) :+: C1 ('MetaCons "FailureInt" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 FailureInternal))) |
data FailureInternal Source #
Constructors
FailureGrpcServer Text | |
FailureGrpcClient Text | |
FailureMath Text | |
FailurePrivate Text | |
FailureRedacted |
Instances
data FailureInput Source #
Constructors
FailureNonce | |
FailureNonSegwitAddr | |
FailureNonValidAddr |
Instances
Out FailureInput Source # | |
Defined in BtcLsp.Data.Type Methods docPrec :: Int -> FailureInput -> Doc # doc :: FailureInput -> Doc # docList :: [FailureInput] -> Doc # | |
Generic FailureInput Source # | |
Defined in BtcLsp.Data.Type Associated Types type Rep FailureInput :: Type -> Type # | |
Show FailureInput Source # | |
Defined in BtcLsp.Data.Type Methods showsPrec :: Int -> FailureInput -> ShowS # show :: FailureInput -> String # showList :: [FailureInput] -> ShowS # | |
Eq FailureInput Source # | |
Defined in BtcLsp.Data.Type | |
type Rep FailureInput Source # | |
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))) |
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 #
data SocketAddress Source #
Constructors
SocketAddress | |
Fields |
Instances
Constructors
BlkHash BlockHash |
Instances
Out BlkHash Source # | |
Generic BlkHash Source # | |
Show BlkHash Source # | |
Eq BlkHash Source # | |
Ord BlkHash Source # | |
PersistField BlkHash Source # | |
Defined in BtcLsp.Data.Type Methods toPersistValue :: BlkHash -> PersistValue # | |
PersistFieldSql BlkHash Source # | |
From BlkHash BlockHash Source # | |
Defined in BtcLsp.Data.Type | |
From BlockHash BlkHash Source # | |
Defined in BtcLsp.Data.Type | |
SymbolToField "hash" Block BlkHash Source # | |
Defined in BtcLsp.Storage.Model Methods | |
type Rep BlkHash Source # | |
Defined in BtcLsp.Data.Type |
Instances
Out BlkHeight Source # | |
ToJSON BlkHeight Source # | |
Defined in BtcLsp.Data.Type | |
Generic BlkHeight Source # | |
Num BlkHeight Source # | |
Defined in BtcLsp.Data.Type | |
Show BlkHeight Source # | |
Eq BlkHeight Source # | |
Ord BlkHeight Source # | |
PersistField BlkHeight Source # | |
Defined in BtcLsp.Data.Type Methods toPersistValue :: BlkHeight -> PersistValue # | |
PersistFieldSql BlkHeight Source # | |
From Word64 BlkHeight Source # | |
Defined in BtcLsp.Data.Type | |
From BlkHeight Word64 Source # | |
Defined in BtcLsp.Data.Type | |
From BlkHeight BlockHeight Source # | |
Defined in BtcLsp.Data.Type | |
From BlkHeight Natural Source # | |
Defined in BtcLsp.Data.Type | |
TryFrom BlockHeight BlkHeight Source # | |
Defined in BtcLsp.Data.Type Methods tryFrom :: BlockHeight -> Either (TryFromException BlockHeight BlkHeight) BlkHeight | |
SymbolToField "height" Block BlkHeight Source # | |
Defined in BtcLsp.Storage.Model Methods | |
type Rep BlkHeight Source # | |
Defined in BtcLsp.Data.Type |
Constructors
BlkConfirmed | |
BlkOrphan |
Instances
Out BlkStatus Source # | |
Generic BlkStatus Source # | |
Read BlkStatus Source # | |
Show BlkStatus Source # | |
Eq BlkStatus Source # | |
Ord BlkStatus Source # | |
PersistField BlkStatus Source # | |
Defined in BtcLsp.Data.Type Methods toPersistValue :: BlkStatus -> PersistValue # | |
PersistFieldSql BlkStatus Source # | |
SymbolToField "status" Block BlkStatus Source # | |
Defined in BtcLsp.Storage.Model Methods | |
type Rep BlkStatus Source # | |
data SwapUtxoStatus Source #
Constructors
SwapUtxoUnspent | |
SwapUtxoUnspentDust | |
SwapUtxoUnspentChanReserve | |
SwapUtxoSpentChanSwapped | |
SwapUtxoSpentRefund | |
SwapUtxoOrphan |
Instances
Instances
Out Privacy Source # | |
Bounded Privacy Source # | |
Enum Privacy Source # | |
Generic Privacy Source # | |
Read Privacy Source # | |
Show Privacy Source # | |
Eq Privacy Source # | |
Ord Privacy Source # | |
PersistField Privacy Source # | |
Defined in BtcLsp.Data.Type Methods toPersistValue :: Privacy -> PersistValue # | |
PersistFieldSql Privacy Source # | |
From Privacy Privacy Source # | |
Defined in BtcLsp.Grpc.Orphan | |
From Privacy Privacy Source # | |
Defined in BtcLsp.Grpc.Orphan | |
SymbolToField "privacy" SwapIntoLn Privacy Source # | |
Defined in BtcLsp.Storage.Model Methods | |
type Rep Privacy Source # | |
newtype NodePubKeyHex Source #
Constructors
NodePubKeyHex Text |
Instances
Constructors
NodeUri | |
Fields |
Instances
Out NodeUri Source # | |
Generic NodeUri Source # | |
Show NodeUri Source # | |
Eq NodeUri Source # | |
Ord NodeUri Source # | |
TryFrom NodeUri NodeUriHex Source # | |
Defined in BtcLsp.Data.Type Methods tryFrom :: NodeUri -> Either (TryFromException NodeUri NodeUriHex) NodeUriHex | |
type Rep NodeUri Source # | |
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 NodeUriHex Source #
Constructors
NodeUriHex Text |
Instances
newtype UtxoLockId Source #
Constructors
UtxoLockId ByteString |
Instances
Constructors
RHashHex | |
Fields
|
Instances
Out RHashHex Source # | |
Generic RHashHex Source # | |
Read RHashHex Source # | |
Show RHashHex Source # | |
Eq RHashHex Source # | |
Ord RHashHex Source # | |
Defined in BtcLsp.Data.Type | |
PathPiece RHashHex Source # | |
Defined in BtcLsp.Data.Type | |
From RHashHex RHash Source # | |
Defined in BtcLsp.Data.Type | |
From RHashHex Text Source # | |
Defined in BtcLsp.Data.Type | |
From RHash RHashHex Source # | |
Defined in BtcLsp.Data.Type | |
From Text RHashHex Source # | |
Defined in BtcLsp.Data.Type | |
type Rep RHashHex Source # | |
Defined in BtcLsp.Data.Type |
data Uuid (tab :: Table) Source #
Instances
SymbolToField "uuid" SwapIntoLn (Uuid 'SwapIntoLnTable) Source # | |
Defined in BtcLsp.Storage.Model Methods symbolToField :: EntityField SwapIntoLn (Uuid 'SwapIntoLnTable) # | |
Out (Uuid tab) Source # | |
Generic (Uuid tab) Source # | |
Read (Uuid tab) Source # | |
Show (Uuid tab) Source # | |
Eq (Uuid tab) Source # | |
Ord (Uuid tab) Source # | |
Defined in BtcLsp.Data.Type | |
PathPiece (Uuid tab) Source # | |
Defined in BtcLsp.Data.Type | |
PersistField (Uuid tab) Source # | |
Defined in BtcLsp.Data.Type Methods toPersistValue :: Uuid tab -> PersistValue # fromPersistValue :: PersistValue -> Either Text (Uuid tab) # | |
PersistFieldSql (Uuid tab) Source # | |
ToMessage (Uuid tab) Source # | |
Defined in BtcLsp.Data.Type | |
type Rep (Uuid tab) Source # | |
Defined in BtcLsp.Data.Type |
Instances
Instances
Out RowQty Source # | |
Generic RowQty Source # | |
Show RowQty Source # | |
Eq RowQty Source # | |
Ord RowQty Source # | |
From Int64 RowQty Source # | |
Defined in BtcLsp.Data.Type | |
From RowQty Int64 Source # | |
Defined in BtcLsp.Data.Type | |
From Int RowQty Source # | |
Defined in BtcLsp.Data.Type | |
type Rep RowQty Source # | |
Defined in BtcLsp.Data.Type |
Constructors
PsbtUtxo | |
Fields
|
Instances
Out PsbtUtxo Source # | |
Generic PsbtUtxo Source # | |
Show PsbtUtxo Source # | |
type Rep PsbtUtxo Source # | |
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))))) |
Instances
Out SwapHash Source # | |
ToJSON SwapHash Source # | |
Defined in BtcLsp.Data.Type | |
Generic SwapHash Source # | |
Read SwapHash Source # | |
Show SwapHash Source # | |
Eq SwapHash Source # | |
PathPiece SwapHash Source # | |
Defined in BtcLsp.Data.Type | |
ToJavascript SwapHash Source # | |
Defined in BtcLsp.Data.Type Methods toJavascript :: SwapHash -> Javascript # | |
ToContent (Maybe SwapHash) Source # | |
ToTypedContent (Maybe SwapHash) Source # | |
Defined in BtcLsp.Data.Type Methods toTypedContent :: Maybe SwapHash -> TypedContent # | |
type Rep SwapHash Source # | |
Defined in BtcLsp.Data.Type |