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

Safe HaskellNone
LanguageHaskell2010

Proto.WalletUnlockerGrpc

Synopsis

Documentation

data WalletUnlocker Source #

Constructors

WalletUnlocker 
Instances
Service WalletUnlocker Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Associated Types

type ServiceName WalletUnlocker :: Symbol

type ServicePackage WalletUnlocker :: Symbol

type ServiceMethods WalletUnlocker :: [Symbol]

HasMethodImpl WalletUnlocker "changePassword" Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Associated Types

type MethodName WalletUnlocker "changePassword" :: Symbol

type MethodInput WalletUnlocker "changePassword" :: Type

type MethodOutput WalletUnlocker "changePassword" :: Type

type MethodStreamingType WalletUnlocker "changePassword" :: StreamingType

HasMethodImpl WalletUnlocker "genSeed" Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Associated Types

type MethodName WalletUnlocker "genSeed" :: Symbol

type MethodInput WalletUnlocker "genSeed" :: Type

type MethodOutput WalletUnlocker "genSeed" :: Type

type MethodStreamingType WalletUnlocker "genSeed" :: StreamingType

HasMethodImpl WalletUnlocker "initWallet" Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Associated Types

type MethodName WalletUnlocker "initWallet" :: Symbol

type MethodInput WalletUnlocker "initWallet" :: Type

type MethodOutput WalletUnlocker "initWallet" :: Type

type MethodStreamingType WalletUnlocker "initWallet" :: StreamingType

HasMethodImpl WalletUnlocker "unlockWallet" Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Associated Types

type MethodName WalletUnlocker "unlockWallet" :: Symbol

type MethodInput WalletUnlocker "unlockWallet" :: Type

type MethodOutput WalletUnlocker "unlockWallet" :: Type

type MethodStreamingType WalletUnlocker "unlockWallet" :: StreamingType

type ServiceMethods WalletUnlocker Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

type ServiceMethods WalletUnlocker = "changePassword" ': ("genSeed" ': ("initWallet" ': ("unlockWallet" ': ([] :: [Symbol]))))
type ServiceName WalletUnlocker Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

type ServiceName WalletUnlocker = "WalletUnlocker"
type ServicePackage WalletUnlocker Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

type ServicePackage WalletUnlocker = "lnrpc"
type MethodInput WalletUnlocker "changePassword" Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

type MethodInput WalletUnlocker "changePassword" = ChangePasswordRequest
type MethodInput WalletUnlocker "genSeed" Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

type MethodInput WalletUnlocker "genSeed" = GenSeedRequest
type MethodInput WalletUnlocker "initWallet" Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

type MethodInput WalletUnlocker "initWallet" = InitWalletRequest
type MethodInput WalletUnlocker "unlockWallet" Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

type MethodInput WalletUnlocker "unlockWallet" = UnlockWalletRequest
type MethodName WalletUnlocker "changePassword" Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

type MethodName WalletUnlocker "changePassword" = "ChangePassword"
type MethodName WalletUnlocker "genSeed" Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

type MethodName WalletUnlocker "genSeed" = "GenSeed"
type MethodName WalletUnlocker "initWallet" Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

type MethodName WalletUnlocker "initWallet" = "InitWallet"
type MethodName WalletUnlocker "unlockWallet" Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

type MethodName WalletUnlocker "unlockWallet" = "UnlockWallet"
type MethodOutput WalletUnlocker "changePassword" Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

type MethodOutput WalletUnlocker "changePassword" = ChangePasswordResponse
type MethodOutput WalletUnlocker "genSeed" Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

type MethodOutput WalletUnlocker "genSeed" = GenSeedResponse
type MethodOutput WalletUnlocker "initWallet" Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

type MethodOutput WalletUnlocker "initWallet" = InitWalletResponse
type MethodOutput WalletUnlocker "unlockWallet" Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

type MethodOutput WalletUnlocker "unlockWallet" = UnlockWalletResponse
type MethodStreamingType WalletUnlocker "changePassword" Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

type MethodStreamingType WalletUnlocker "changePassword" = NonStreaming
type MethodStreamingType WalletUnlocker "genSeed" Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

type MethodStreamingType WalletUnlocker "genSeed" = NonStreaming
type MethodStreamingType WalletUnlocker "initWallet" Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

type MethodStreamingType WalletUnlocker "initWallet" = NonStreaming
type MethodStreamingType WalletUnlocker "unlockWallet" Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

type MethodStreamingType WalletUnlocker "unlockWallet" = NonStreaming

data ChangePasswordRequest Source #

Fields :

Instances
Eq ChangePasswordRequest Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Ord ChangePasswordRequest Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Show ChangePasswordRequest Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

NFData ChangePasswordRequest Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

rnf :: ChangePasswordRequest -> () #

Message ChangePasswordRequest Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

HasField ChangePasswordRequest "currentPassword" ByteString Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

fieldOf :: Functor f => Proxy# "currentPassword" -> (ByteString -> f ByteString) -> ChangePasswordRequest -> f ChangePasswordRequest

HasField ChangePasswordRequest "newMacaroonRootKey" Bool Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

fieldOf :: Functor f => Proxy# "newMacaroonRootKey" -> (Bool -> f Bool) -> ChangePasswordRequest -> f ChangePasswordRequest

HasField ChangePasswordRequest "newPassword" ByteString Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

HasField ChangePasswordRequest "statelessInit" Bool Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

fieldOf :: Functor f => Proxy# "statelessInit" -> (Bool -> f Bool) -> ChangePasswordRequest -> f ChangePasswordRequest

data ChangePasswordResponse Source #

Fields :

  • adminMacaroon :: Lens' ChangePasswordResponse Data.ByteString.ByteString
Instances
Eq ChangePasswordResponse Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Ord ChangePasswordResponse Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Show ChangePasswordResponse Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

NFData ChangePasswordResponse Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

rnf :: ChangePasswordResponse -> () #

Message ChangePasswordResponse Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

HasField ChangePasswordResponse "adminMacaroon" ByteString Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

data GenSeedRequest Source #

Fields :

Instances
Eq GenSeedRequest Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Ord GenSeedRequest Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Show GenSeedRequest Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

NFData GenSeedRequest Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

rnf :: GenSeedRequest -> () #

Message GenSeedRequest Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

HasField GenSeedRequest "aezeedPassphrase" ByteString Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

fieldOf :: Functor f => Proxy# "aezeedPassphrase" -> (ByteString -> f ByteString) -> GenSeedRequest -> f GenSeedRequest

HasField GenSeedRequest "seedEntropy" ByteString Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

fieldOf :: Functor f => Proxy# "seedEntropy" -> (ByteString -> f ByteString) -> GenSeedRequest -> f GenSeedRequest

data GenSeedResponse Source #

Fields :

Instances
Eq GenSeedResponse Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Ord GenSeedResponse Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Show GenSeedResponse Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

NFData GenSeedResponse Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

rnf :: GenSeedResponse -> () #

Message GenSeedResponse Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

HasField GenSeedResponse "encipheredSeed" ByteString Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

fieldOf :: Functor f => Proxy# "encipheredSeed" -> (ByteString -> f ByteString) -> GenSeedResponse -> f GenSeedResponse

HasField GenSeedResponse "cipherSeedMnemonic" [Text] Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

fieldOf :: Functor f => Proxy# "cipherSeedMnemonic" -> ([Text] -> f [Text]) -> GenSeedResponse -> f GenSeedResponse

HasField GenSeedResponse "vec'cipherSeedMnemonic" (Vector Text) Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'cipherSeedMnemonic" -> (Vector Text -> f (Vector Text)) -> GenSeedResponse -> f GenSeedResponse

data InitWalletRequest Source #

Fields :

Instances
Eq InitWalletRequest Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Ord InitWalletRequest Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Show InitWalletRequest Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

NFData InitWalletRequest Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

rnf :: InitWalletRequest -> () #

Message InitWalletRequest Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

ToGrpc InitWalletRequest InitWalletRequest Source # 
Instance details

Defined in LndClient.Data.InitWallet

HasField InitWalletRequest "aezeedPassphrase" ByteString Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

fieldOf :: Functor f => Proxy# "aezeedPassphrase" -> (ByteString -> f ByteString) -> InitWalletRequest -> f InitWalletRequest

HasField InitWalletRequest "channelBackups" ChanBackupSnapshot Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

HasField InitWalletRequest "recoveryWindow" Int32 Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

fieldOf :: Functor f => Proxy# "recoveryWindow" -> (Int32 -> f Int32) -> InitWalletRequest -> f InitWalletRequest

HasField InitWalletRequest "statelessInit" Bool Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

fieldOf :: Functor f => Proxy# "statelessInit" -> (Bool -> f Bool) -> InitWalletRequest -> f InitWalletRequest

HasField InitWalletRequest "walletPassword" ByteString Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

fieldOf :: Functor f => Proxy# "walletPassword" -> (ByteString -> f ByteString) -> InitWalletRequest -> f InitWalletRequest

HasField InitWalletRequest "cipherSeedMnemonic" [Text] Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

fieldOf :: Functor f => Proxy# "cipherSeedMnemonic" -> ([Text] -> f [Text]) -> InitWalletRequest -> f InitWalletRequest

HasField InitWalletRequest "maybe'channelBackups" (Maybe ChanBackupSnapshot) Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

HasField InitWalletRequest "vec'cipherSeedMnemonic" (Vector Text) Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

fieldOf :: Functor f => Proxy# "vec'cipherSeedMnemonic" -> (Vector Text -> f (Vector Text)) -> InitWalletRequest -> f InitWalletRequest

data InitWalletResponse Source #

Fields :

  • adminMacaroon :: Lens' InitWalletResponse Data.ByteString.ByteString
Instances
Eq InitWalletResponse Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Ord InitWalletResponse Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Show InitWalletResponse Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

NFData InitWalletResponse Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

rnf :: InitWalletResponse -> () #

Message InitWalletResponse Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

HasField InitWalletResponse "adminMacaroon" ByteString Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

fieldOf :: Functor f => Proxy# "adminMacaroon" -> (ByteString -> f ByteString) -> InitWalletResponse -> f InitWalletResponse

data UnlockWalletRequest Source #

Fields :

Instances
Eq UnlockWalletRequest Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Ord UnlockWalletRequest Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Show UnlockWalletRequest Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

NFData UnlockWalletRequest Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

rnf :: UnlockWalletRequest -> () #

Message UnlockWalletRequest Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

ToGrpc UnlockWalletRequest UnlockWalletRequest Source # 
Instance details

Defined in LndClient.Data.UnlockWallet

HasField UnlockWalletRequest "channelBackups" ChanBackupSnapshot Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

HasField UnlockWalletRequest "recoveryWindow" Int32 Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

fieldOf :: Functor f => Proxy# "recoveryWindow" -> (Int32 -> f Int32) -> UnlockWalletRequest -> f UnlockWalletRequest

HasField UnlockWalletRequest "statelessInit" Bool Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

fieldOf :: Functor f => Proxy# "statelessInit" -> (Bool -> f Bool) -> UnlockWalletRequest -> f UnlockWalletRequest

HasField UnlockWalletRequest "walletPassword" ByteString Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

fieldOf :: Functor f => Proxy# "walletPassword" -> (ByteString -> f ByteString) -> UnlockWalletRequest -> f UnlockWalletRequest

HasField UnlockWalletRequest "maybe'channelBackups" (Maybe ChanBackupSnapshot) Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

data UnlockWalletResponse Source #

Fields :

Instances
Eq UnlockWalletResponse Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Ord UnlockWalletResponse Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Show UnlockWalletResponse Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

NFData UnlockWalletResponse Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc

Methods

rnf :: UnlockWalletResponse -> () #

Message UnlockWalletResponse Source # 
Instance details

Defined in Proto.WalletUnlockerGrpc