Safe Haskell | None |
---|---|
Language | Haskell2010 |
LndClient.Data.Newtype
Documentation
Instances
Eq AddIndex Source # | |
Ord AddIndex Source # | |
Defined in LndClient.Data.Newtype | |
Show AddIndex Source # | |
PersistField AddIndex Source # | |
Defined in LndClient.Data.Newtype Methods toPersistValue :: AddIndex -> PersistValue fromPersistValue :: PersistValue -> Either Text AddIndex | |
PersistFieldSql AddIndex Source # | |
Defined in LndClient.Data.Newtype | |
FromGrpc AddIndex Word64 Source # | |
ToGrpc AddIndex Word64 Source # | |
newtype SettleIndex Source #
Constructors
SettleIndex Word64 |
Instances
newtype PaymentRequest Source #
Constructors
PaymentRequest Text |
Instances
Constructors
RHash ByteString |
Instances
Eq RHash Source # | |
Ord RHash Source # | |
Show RHash Source # | |
PersistField RHash Source # | |
Defined in LndClient.Data.Newtype | |
PersistFieldSql RHash Source # | |
Defined in LndClient.Data.Newtype | |
FromGrpc RHash ByteString Source # | |
Defined in LndClient.Data.Newtype | |
FromGrpc RHash Text Source # | |
ToGrpc RHash ByteString Source # | |
Defined in LndClient.Data.Newtype | |
ToGrpc RHash PaymentHash Source # | |
Defined in LndClient.Data.Newtype | |
ToGrpc RHash SubscribeSingleInvoiceRequest Source # | |
Defined in LndClient.Data.Newtype | |
ToGrpc RHash CancelInvoiceMsg Source # | |
Defined in LndClient.Data.Newtype |
Constructors
RPreimage ByteString |
Instances
Eq RPreimage Source # | |
Ord RPreimage Source # | |
Show RPreimage Source # | |
PersistField RPreimage Source # | |
Defined in LndClient.Data.Newtype Methods toPersistValue :: RPreimage -> PersistValue fromPersistValue :: PersistValue -> Either Text RPreimage | |
PersistFieldSql RPreimage Source # | |
Defined in LndClient.Data.Newtype | |
FromGrpc RPreimage ByteString Source # | |
Defined in LndClient.Data.Newtype | |
FromGrpc RPreimage Text Source # | |
ToGrpc RPreimage ByteString Source # | |
Defined in LndClient.Data.Newtype | |
ToGrpc RPreimage SettleInvoiceMsg Source # | |
Defined in LndClient.Data.Newtype |
Instances
Eq MSat Source # | |
Num MSat Source # | |
Ord MSat Source # | |
Show MSat Source # | |
FromJSON MSat Source # | |
Defined in LndClient.Data.Newtype | |
PersistField MSat Source # | |
Defined in LndClient.Data.Newtype | |
PersistFieldSql MSat Source # | |
Defined in LndClient.Data.Newtype | |
FromGrpc MSat Int64 Source # | |
FromGrpc MSat Word64 Source # | |
ToGrpc MSat Int64 Source # | |
newtype CipherSeedMnemonic Source #
Constructors
CipherSeedMnemonic [Text] |
Instances
Eq CipherSeedMnemonic Source # | |
Defined in LndClient.Data.Newtype Methods (==) :: CipherSeedMnemonic -> CipherSeedMnemonic -> Bool # (/=) :: CipherSeedMnemonic -> CipherSeedMnemonic -> Bool # | |
Show CipherSeedMnemonic Source # | |
Defined in LndClient.Data.Newtype Methods showsPrec :: Int -> CipherSeedMnemonic -> ShowS # show :: CipherSeedMnemonic -> String # showList :: [CipherSeedMnemonic] -> ShowS # | |
FromJSON CipherSeedMnemonic Source # | |
Defined in LndClient.Data.Newtype Methods parseJSON :: Value -> Parser CipherSeedMnemonic # parseJSONList :: Value -> Parser [CipherSeedMnemonic] # | |
PersistField CipherSeedMnemonic Source # | |
Defined in LndClient.Data.Newtype Methods toPersistValue :: CipherSeedMnemonic -> PersistValue fromPersistValue :: PersistValue -> Either Text CipherSeedMnemonic | |
PersistFieldSql CipherSeedMnemonic Source # | |
Defined in LndClient.Data.Newtype Methods sqlType :: Proxy CipherSeedMnemonic -> SqlType | |
ToGrpc CipherSeedMnemonic [Text] Source # | |
Defined in LndClient.Data.Newtype |
newtype AezeedPassphrase Source #
Constructors
AezeedPassphrase Text |
Instances
Instances
Eq Seconds Source # | |
Show Seconds Source # | |
FromJSON Seconds Source # | |
Defined in LndClient.Data.Newtype | |
PersistField Seconds Source # | |
Defined in LndClient.Data.Newtype Methods toPersistValue :: Seconds -> PersistValue fromPersistValue :: PersistValue -> Either Text Seconds | |
PersistFieldSql Seconds Source # | |
Defined in LndClient.Data.Newtype | |
FromGrpc Seconds Int64 Source # | |
ToGrpc Seconds Int64 Source # | |
newtype NodePubKey Source #
Constructors
NodePubKey ByteString |
Instances
newtype NodeLocation Source #
Constructors
NodeLocation Text |
Instances
data GrpcTimeoutSeconds Source #
Instances
newRPreimage :: MonadIO m => m RPreimage Source #
newtype TxId (a :: TxKind) Source #
Constructors
TxId ByteString |
Instances
Eq (TxId a) Source # | |
Ord (TxId a) Source # | |
Show (TxId a) Source # | |
PersistField (TxId a) Source # | |
Defined in LndClient.Data.Newtype Methods toPersistValue :: TxId a -> PersistValue fromPersistValue :: PersistValue -> Either Text (TxId a) | |
PersistFieldSql (TxId a) Source # | |
Defined in LndClient.Data.Newtype | |
FromGrpc (TxId a) Text Source # | |
FromGrpc (TxId a) ByteString Source # | |
Defined in LndClient.Data.Newtype | |
ToGrpc (TxId a) ByteString Source # | |
Defined in LndClient.Data.Newtype |
newtype Vout (a :: TxKind) Source #
Instances
Eq (Vout a) Source # | |
Ord (Vout a) Source # | |
Read (Vout a) Source # | |
Show (Vout a) Source # | |
PersistField (Vout a) Source # | |
Defined in LndClient.Data.Newtype Methods toPersistValue :: Vout a -> PersistValue fromPersistValue :: PersistValue -> Either Text (Vout a) | |
PersistFieldSql (Vout a) Source # | |
Defined in LndClient.Data.Newtype | |
FromGrpc (Vout a) Word32 Source # | |
ToGrpc (Vout a) Word32 Source # | |