utxorpc-0.0.6.0: Generated code for a gRPC interface for UTxO Blockchains
Safe HaskellSafe-Inferred
LanguageHaskell2010

Proto.Utxorpc.V1alpha.Submit.Submit

Synopsis

Documentation

data SubmitService Source #

Constructors

SubmitService 

Instances

Instances details
Service SubmitService Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

HasMethodImpl SubmitService "evalTx" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Associated Types

type MethodName SubmitService "evalTx" :: Symbol #

type MethodInput SubmitService "evalTx" #

type MethodOutput SubmitService "evalTx" #

type MethodStreamingType SubmitService "evalTx" :: StreamingType #

HasMethodImpl SubmitService "readMempool" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Associated Types

type MethodName SubmitService "readMempool" :: Symbol #

type MethodInput SubmitService "readMempool" #

type MethodOutput SubmitService "readMempool" #

type MethodStreamingType SubmitService "readMempool" :: StreamingType #

HasMethodImpl SubmitService "submitTx" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Associated Types

type MethodName SubmitService "submitTx" :: Symbol #

type MethodInput SubmitService "submitTx" #

type MethodOutput SubmitService "submitTx" #

type MethodStreamingType SubmitService "submitTx" :: StreamingType #

HasMethodImpl SubmitService "waitForTx" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Associated Types

type MethodName SubmitService "waitForTx" :: Symbol #

type MethodInput SubmitService "waitForTx" #

type MethodOutput SubmitService "waitForTx" #

type MethodStreamingType SubmitService "waitForTx" :: StreamingType #

HasMethodImpl SubmitService "watchMempool" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Associated Types

type MethodName SubmitService "watchMempool" :: Symbol #

type MethodInput SubmitService "watchMempool" #

type MethodOutput SubmitService "watchMempool" #

type MethodStreamingType SubmitService "watchMempool" :: StreamingType #

type ServiceMethods SubmitService Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

type ServiceMethods SubmitService = '["evalTx", "readMempool", "submitTx", "waitForTx", "watchMempool"]
type ServiceName SubmitService Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

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

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

type ServicePackage SubmitService = "utxorpc.v1alpha.submit"
type MethodInput SubmitService "evalTx" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

type MethodInput SubmitService "readMempool" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

type MethodInput SubmitService "submitTx" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

type MethodInput SubmitService "waitForTx" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

type MethodInput SubmitService "watchMempool" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

type MethodName SubmitService "evalTx" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

type MethodName SubmitService "evalTx" = "EvalTx"
type MethodName SubmitService "readMempool" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

type MethodName SubmitService "readMempool" = "ReadMempool"
type MethodName SubmitService "submitTx" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

type MethodName SubmitService "submitTx" = "SubmitTx"
type MethodName SubmitService "waitForTx" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

type MethodName SubmitService "waitForTx" = "WaitForTx"
type MethodName SubmitService "watchMempool" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

type MethodName SubmitService "watchMempool" = "WatchMempool"
type MethodOutput SubmitService "evalTx" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

type MethodOutput SubmitService "readMempool" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

type MethodOutput SubmitService "submitTx" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

type MethodOutput SubmitService "waitForTx" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

type MethodOutput SubmitService "watchMempool" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

type MethodStreamingType SubmitService "evalTx" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

type MethodStreamingType SubmitService "readMempool" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

type MethodStreamingType SubmitService "submitTx" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

type MethodStreamingType SubmitService "waitForTx" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

type MethodStreamingType SubmitService "watchMempool" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

data AnyChainEval Source #

Fields :

  • maybe'chain :: Lens' AnyChainEval (Prelude.Maybe AnyChainEval'Chain)
  • maybe'cardano :: Lens' AnyChainEval (Prelude.Maybe Proto.Utxorpc.V1alpha.Cardano.Cardano.TxEval)
  • cardano :: Lens' AnyChainEval Proto.Utxorpc.V1alpha.Cardano.Cardano.TxEval

Instances

Instances details
Show AnyChainEval Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

NFData AnyChainEval Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

rnf :: AnyChainEval -> () #

Eq AnyChainEval Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Ord AnyChainEval Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Message AnyChainEval Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

HasField AnyChainEval "cardano" TxEval Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "cardano" -> (TxEval -> f TxEval) -> AnyChainEval -> f AnyChainEval #

HasField AnyChainEval "maybe'cardano" (Maybe TxEval) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "maybe'cardano" -> (Maybe TxEval -> f (Maybe TxEval)) -> AnyChainEval -> f AnyChainEval #

HasField AnyChainEval "maybe'chain" (Maybe AnyChainEval'Chain) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

HasField EvalTxResponse "report" [AnyChainEval] Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "report" -> ([AnyChainEval] -> f [AnyChainEval]) -> EvalTxResponse -> f EvalTxResponse #

HasField EvalTxResponse "vec'report" (Vector AnyChainEval) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "vec'report" -> (Vector AnyChainEval -> f (Vector AnyChainEval)) -> EvalTxResponse -> f EvalTxResponse #

data AnyChainEval'Chain Source #

data AnyChainTx Source #

Fields :

  • maybe'type' :: Lens' AnyChainTx (Prelude.Maybe AnyChainTx'Type)
  • maybe'raw :: Lens' AnyChainTx (Prelude.Maybe Data.ByteString.ByteString)
  • raw :: Lens' AnyChainTx Data.ByteString.ByteString

Instances

Instances details
Show AnyChainTx Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

NFData AnyChainTx Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

rnf :: AnyChainTx -> () #

Eq AnyChainTx Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Ord AnyChainTx Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Message AnyChainTx Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

HasField AnyChainTx "raw" ByteString Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "raw" -> (ByteString -> f ByteString) -> AnyChainTx -> f AnyChainTx #

HasField TxInMempool "tx" AnyChainTx Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "tx" -> (AnyChainTx -> f AnyChainTx) -> TxInMempool -> f TxInMempool #

HasField AnyChainTx "maybe'raw" (Maybe ByteString) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "maybe'raw" -> (Maybe ByteString -> f (Maybe ByteString)) -> AnyChainTx -> f AnyChainTx #

HasField AnyChainTx "maybe'type'" (Maybe AnyChainTx'Type) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "maybe'type'" -> (Maybe AnyChainTx'Type -> f (Maybe AnyChainTx'Type)) -> AnyChainTx -> f AnyChainTx #

HasField EvalTxRequest "tx" [AnyChainTx] Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "tx" -> ([AnyChainTx] -> f [AnyChainTx]) -> EvalTxRequest -> f EvalTxRequest #

HasField EvalTxRequest "vec'tx" (Vector AnyChainTx) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "vec'tx" -> (Vector AnyChainTx -> f (Vector AnyChainTx)) -> EvalTxRequest -> f EvalTxRequest #

HasField SubmitTxRequest "tx" [AnyChainTx] Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "tx" -> ([AnyChainTx] -> f [AnyChainTx]) -> SubmitTxRequest -> f SubmitTxRequest #

HasField SubmitTxRequest "vec'tx" (Vector AnyChainTx) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

HasField TxInMempool "maybe'tx" (Maybe AnyChainTx) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "maybe'tx" -> (Maybe AnyChainTx -> f (Maybe AnyChainTx)) -> TxInMempool -> f TxInMempool #

data AnyChainTxPattern Source #

Fields :

  • maybe'chain :: Lens' AnyChainTxPattern (Prelude.Maybe AnyChainTxPattern'Chain)
  • maybe'cardano :: Lens' AnyChainTxPattern (Prelude.Maybe Proto.Utxorpc.V1alpha.Cardano.Cardano.TxPattern)
  • cardano :: Lens' AnyChainTxPattern Proto.Utxorpc.V1alpha.Cardano.Cardano.TxPattern

Instances

Instances details
Show AnyChainTxPattern Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

NFData AnyChainTxPattern Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

rnf :: AnyChainTxPattern -> () #

Eq AnyChainTxPattern Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Ord AnyChainTxPattern Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Message AnyChainTxPattern Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

HasField AnyChainTxPattern "cardano" TxPattern Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "cardano" -> (TxPattern -> f TxPattern) -> AnyChainTxPattern -> f AnyChainTxPattern #

HasField TxPredicate "match" AnyChainTxPattern Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

HasField AnyChainTxPattern "maybe'cardano" (Maybe TxPattern) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "maybe'cardano" -> (Maybe TxPattern -> f (Maybe TxPattern)) -> AnyChainTxPattern -> f AnyChainTxPattern #

HasField AnyChainTxPattern "maybe'chain" (Maybe AnyChainTxPattern'Chain) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

HasField TxPredicate "maybe'match" (Maybe AnyChainTxPattern) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "maybe'match" -> (Maybe AnyChainTxPattern -> f (Maybe AnyChainTxPattern)) -> TxPredicate -> f TxPredicate #

data AnyChainTxPattern'Chain Source #

Instances

Instances details
Show AnyChainTxPattern'Chain Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

NFData AnyChainTxPattern'Chain Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

rnf :: AnyChainTxPattern'Chain -> () #

Eq AnyChainTxPattern'Chain Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Ord AnyChainTxPattern'Chain Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

HasField AnyChainTxPattern "maybe'chain" (Maybe AnyChainTxPattern'Chain) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

data EvalTxRequest Source #

Fields :

  • tx :: Lens' EvalTxRequest [AnyChainTx]
  • vec'tx :: Lens' EvalTxRequest (Data.Vector.Vector AnyChainTx)

Instances

Instances details
Show EvalTxRequest Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

NFData EvalTxRequest Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

rnf :: EvalTxRequest -> () #

Eq EvalTxRequest Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Ord EvalTxRequest Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Message EvalTxRequest Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

HasField EvalTxRequest "tx" [AnyChainTx] Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "tx" -> ([AnyChainTx] -> f [AnyChainTx]) -> EvalTxRequest -> f EvalTxRequest #

HasField EvalTxRequest "vec'tx" (Vector AnyChainTx) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "vec'tx" -> (Vector AnyChainTx -> f (Vector AnyChainTx)) -> EvalTxRequest -> f EvalTxRequest #

data EvalTxResponse Source #

Fields :

  • report :: Lens' EvalTxResponse [AnyChainEval]
  • vec'report :: Lens' EvalTxResponse (Data.Vector.Vector AnyChainEval)

Instances

Instances details
Show EvalTxResponse Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

NFData EvalTxResponse Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

rnf :: EvalTxResponse -> () #

Eq EvalTxResponse Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Ord EvalTxResponse Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Message EvalTxResponse Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

HasField EvalTxResponse "report" [AnyChainEval] Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "report" -> ([AnyChainEval] -> f [AnyChainEval]) -> EvalTxResponse -> f EvalTxResponse #

HasField EvalTxResponse "vec'report" (Vector AnyChainEval) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "vec'report" -> (Vector AnyChainEval -> f (Vector AnyChainEval)) -> EvalTxResponse -> f EvalTxResponse #

data ReadMempoolRequest Source #

Fields :

  • tx :: Lens' ReadMempoolRequest [TxInMempool]
  • vec'tx :: Lens' ReadMempoolRequest (Data.Vector.Vector TxInMempool)

Instances

Instances details
Show ReadMempoolRequest Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

NFData ReadMempoolRequest Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

rnf :: ReadMempoolRequest -> () #

Eq ReadMempoolRequest Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Ord ReadMempoolRequest Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Message ReadMempoolRequest Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

HasField ReadMempoolRequest "tx" [TxInMempool] Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

HasField ReadMempoolRequest "vec'tx" (Vector TxInMempool) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

data ReadMempoolResponse Source #

Fields :

  • stage :: Lens' ReadMempoolResponse [Stage]
  • vec'stage :: Lens' ReadMempoolResponse (Data.Vector.Vector Stage)

Instances

Instances details
Show ReadMempoolResponse Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

NFData ReadMempoolResponse Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

rnf :: ReadMempoolResponse -> () #

Eq ReadMempoolResponse Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Ord ReadMempoolResponse Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Message ReadMempoolResponse Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

HasField ReadMempoolResponse "stage" [Stage] Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "stage" -> ([Stage] -> f [Stage]) -> ReadMempoolResponse -> f ReadMempoolResponse #

HasField ReadMempoolResponse "vec'stage" (Vector Stage) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "vec'stage" -> (Vector Stage -> f (Vector Stage)) -> ReadMempoolResponse -> f ReadMempoolResponse #

data Stage Source #

Instances

Instances details
Bounded Stage Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Enum Stage Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Show Stage Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

showsPrec :: Int -> Stage -> ShowS #

show :: Stage -> String #

showList :: [Stage] -> ShowS #

NFData Stage Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

rnf :: Stage -> () #

Eq Stage Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

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

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

Ord Stage Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

compare :: Stage -> Stage -> Ordering #

(<) :: Stage -> Stage -> Bool #

(<=) :: Stage -> Stage -> Bool #

(>) :: Stage -> Stage -> Bool #

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

max :: Stage -> Stage -> Stage #

min :: Stage -> Stage -> Stage #

FieldDefault Stage Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldDefault :: Stage #

MessageEnum Stage Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

HasField TxInMempool "stage" Stage Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "stage" -> (Stage -> f Stage) -> TxInMempool -> f TxInMempool #

HasField WaitForTxResponse "stage" Stage Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "stage" -> (Stage -> f Stage) -> WaitForTxResponse -> f WaitForTxResponse #

HasField ReadMempoolResponse "stage" [Stage] Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "stage" -> ([Stage] -> f [Stage]) -> ReadMempoolResponse -> f ReadMempoolResponse #

HasField ReadMempoolResponse "vec'stage" (Vector Stage) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "vec'stage" -> (Vector Stage -> f (Vector Stage)) -> ReadMempoolResponse -> f ReadMempoolResponse #

data Stage Source #

Instances

Instances details
Bounded Stage Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Enum Stage Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Show Stage Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

showsPrec :: Int -> Stage -> ShowS #

show :: Stage -> String #

showList :: [Stage] -> ShowS #

NFData Stage Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

rnf :: Stage -> () #

Eq Stage Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

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

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

Ord Stage Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

compare :: Stage -> Stage -> Ordering #

(<) :: Stage -> Stage -> Bool #

(<=) :: Stage -> Stage -> Bool #

(>) :: Stage -> Stage -> Bool #

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

max :: Stage -> Stage -> Stage #

min :: Stage -> Stage -> Stage #

FieldDefault Stage Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldDefault :: Stage #

MessageEnum Stage Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

HasField TxInMempool "stage" Stage Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "stage" -> (Stage -> f Stage) -> TxInMempool -> f TxInMempool #

HasField WaitForTxResponse "stage" Stage Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "stage" -> (Stage -> f Stage) -> WaitForTxResponse -> f WaitForTxResponse #

HasField ReadMempoolResponse "stage" [Stage] Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "stage" -> ([Stage] -> f [Stage]) -> ReadMempoolResponse -> f ReadMempoolResponse #

HasField ReadMempoolResponse "vec'stage" (Vector Stage) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "vec'stage" -> (Vector Stage -> f (Vector Stage)) -> ReadMempoolResponse -> f ReadMempoolResponse #

data SubmitTxRequest Source #

Fields :

  • tx :: Lens' SubmitTxRequest [AnyChainTx]
  • vec'tx :: Lens' SubmitTxRequest (Data.Vector.Vector AnyChainTx)

Instances

Instances details
Show SubmitTxRequest Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

NFData SubmitTxRequest Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

rnf :: SubmitTxRequest -> () #

Eq SubmitTxRequest Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Ord SubmitTxRequest Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Message SubmitTxRequest Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

HasField SubmitTxRequest "tx" [AnyChainTx] Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "tx" -> ([AnyChainTx] -> f [AnyChainTx]) -> SubmitTxRequest -> f SubmitTxRequest #

HasField SubmitTxRequest "vec'tx" (Vector AnyChainTx) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

data SubmitTxResponse Source #

Fields :

  • ref :: Lens' SubmitTxResponse [Data.ByteString.ByteString]
  • vec'ref :: Lens' SubmitTxResponse (Data.Vector.Vector Data.ByteString.ByteString)

Instances

Instances details
Show SubmitTxResponse Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

NFData SubmitTxResponse Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

rnf :: SubmitTxResponse -> () #

Eq SubmitTxResponse Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Ord SubmitTxResponse Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Message SubmitTxResponse Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

HasField SubmitTxResponse "ref" [ByteString] Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "ref" -> ([ByteString] -> f [ByteString]) -> SubmitTxResponse -> f SubmitTxResponse #

HasField SubmitTxResponse "vec'ref" (Vector ByteString) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

data TxInMempool Source #

Fields :

  • tx :: Lens' TxInMempool AnyChainTx
  • maybe'tx :: Lens' TxInMempool (Prelude.Maybe AnyChainTx)
  • stage :: Lens' TxInMempool Stage

Instances

Instances details
Show TxInMempool Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

NFData TxInMempool Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

rnf :: TxInMempool -> () #

Eq TxInMempool Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Ord TxInMempool Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Message TxInMempool Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

HasField TxInMempool "stage" Stage Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "stage" -> (Stage -> f Stage) -> TxInMempool -> f TxInMempool #

HasField TxInMempool "tx" AnyChainTx Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "tx" -> (AnyChainTx -> f AnyChainTx) -> TxInMempool -> f TxInMempool #

HasField WatchMempoolResponse "tx" TxInMempool Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

HasField ReadMempoolRequest "tx" [TxInMempool] Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

HasField ReadMempoolRequest "vec'tx" (Vector TxInMempool) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

HasField TxInMempool "maybe'tx" (Maybe AnyChainTx) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "maybe'tx" -> (Maybe AnyChainTx -> f (Maybe AnyChainTx)) -> TxInMempool -> f TxInMempool #

HasField WatchMempoolResponse "maybe'tx" (Maybe TxInMempool) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

data TxPredicate Source #

Fields :

  • match :: Lens' TxPredicate AnyChainTxPattern
  • maybe'match :: Lens' TxPredicate (Prelude.Maybe AnyChainTxPattern)
  • not :: Lens' TxPredicate [TxPredicate]
  • vec'not :: Lens' TxPredicate (Data.Vector.Vector TxPredicate)
  • allOf :: Lens' TxPredicate [TxPredicate]
  • vec'allOf :: Lens' TxPredicate (Data.Vector.Vector TxPredicate)
  • anyOf :: Lens' TxPredicate [TxPredicate]
  • vec'anyOf :: Lens' TxPredicate (Data.Vector.Vector TxPredicate)

Instances

Instances details
Show TxPredicate Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

NFData TxPredicate Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

rnf :: TxPredicate -> () #

Eq TxPredicate Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Ord TxPredicate Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Message TxPredicate Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

HasField TxPredicate "match" AnyChainTxPattern Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

HasField WatchMempoolRequest "predicate" TxPredicate Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

HasField TxPredicate "allOf" [TxPredicate] Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "allOf" -> ([TxPredicate] -> f [TxPredicate]) -> TxPredicate -> f TxPredicate #

HasField TxPredicate "anyOf" [TxPredicate] Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "anyOf" -> ([TxPredicate] -> f [TxPredicate]) -> TxPredicate -> f TxPredicate #

HasField TxPredicate "maybe'match" (Maybe AnyChainTxPattern) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "maybe'match" -> (Maybe AnyChainTxPattern -> f (Maybe AnyChainTxPattern)) -> TxPredicate -> f TxPredicate #

HasField TxPredicate "not" [TxPredicate] Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "not" -> ([TxPredicate] -> f [TxPredicate]) -> TxPredicate -> f TxPredicate #

HasField TxPredicate "vec'allOf" (Vector TxPredicate) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "vec'allOf" -> (Vector TxPredicate -> f (Vector TxPredicate)) -> TxPredicate -> f TxPredicate #

HasField TxPredicate "vec'anyOf" (Vector TxPredicate) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "vec'anyOf" -> (Vector TxPredicate -> f (Vector TxPredicate)) -> TxPredicate -> f TxPredicate #

HasField TxPredicate "vec'not" (Vector TxPredicate) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "vec'not" -> (Vector TxPredicate -> f (Vector TxPredicate)) -> TxPredicate -> f TxPredicate #

HasField WatchMempoolRequest "maybe'predicate" (Maybe TxPredicate) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "maybe'predicate" -> (Maybe TxPredicate -> f (Maybe TxPredicate)) -> WatchMempoolRequest -> f WatchMempoolRequest #

data WaitForTxRequest Source #

Fields :

  • ref :: Lens' WaitForTxRequest [Data.ByteString.ByteString]
  • vec'ref :: Lens' WaitForTxRequest (Data.Vector.Vector Data.ByteString.ByteString)

Instances

Instances details
Show WaitForTxRequest Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

NFData WaitForTxRequest Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

rnf :: WaitForTxRequest -> () #

Eq WaitForTxRequest Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Ord WaitForTxRequest Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Message WaitForTxRequest Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

HasField WaitForTxRequest "ref" [ByteString] Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "ref" -> ([ByteString] -> f [ByteString]) -> WaitForTxRequest -> f WaitForTxRequest #

HasField WaitForTxRequest "vec'ref" (Vector ByteString) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

data WaitForTxResponse Source #

Fields :

  • ref :: Lens' WaitForTxResponse Data.ByteString.ByteString
  • stage :: Lens' WaitForTxResponse Stage

Instances

Instances details
Show WaitForTxResponse Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

NFData WaitForTxResponse Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

rnf :: WaitForTxResponse -> () #

Eq WaitForTxResponse Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Ord WaitForTxResponse Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Message WaitForTxResponse Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

HasField WaitForTxResponse "ref" ByteString Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

HasField WaitForTxResponse "stage" Stage Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "stage" -> (Stage -> f Stage) -> WaitForTxResponse -> f WaitForTxResponse #

data WatchMempoolRequest Source #

Fields :

  • predicate :: Lens' WatchMempoolRequest TxPredicate
  • maybe'predicate :: Lens' WatchMempoolRequest (Prelude.Maybe TxPredicate)
  • fieldMask :: Lens' WatchMempoolRequest Proto.Google.Protobuf.FieldMask.FieldMask
  • maybe'fieldMask :: Lens' WatchMempoolRequest (Prelude.Maybe Proto.Google.Protobuf.FieldMask.FieldMask)

Instances

Instances details
Show WatchMempoolRequest Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

NFData WatchMempoolRequest Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

rnf :: WatchMempoolRequest -> () #

Eq WatchMempoolRequest Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Ord WatchMempoolRequest Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Message WatchMempoolRequest Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

HasField WatchMempoolRequest "fieldMask" FieldMask Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "fieldMask" -> (FieldMask -> f FieldMask) -> WatchMempoolRequest -> f WatchMempoolRequest #

HasField WatchMempoolRequest "predicate" TxPredicate Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

HasField WatchMempoolRequest "maybe'fieldMask" (Maybe FieldMask) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "maybe'fieldMask" -> (Maybe FieldMask -> f (Maybe FieldMask)) -> WatchMempoolRequest -> f WatchMempoolRequest #

HasField WatchMempoolRequest "maybe'predicate" (Maybe TxPredicate) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

fieldOf :: Functor f => Proxy# "maybe'predicate" -> (Maybe TxPredicate -> f (Maybe TxPredicate)) -> WatchMempoolRequest -> f WatchMempoolRequest #

data WatchMempoolResponse Source #

Fields :

  • tx :: Lens' WatchMempoolResponse TxInMempool
  • maybe'tx :: Lens' WatchMempoolResponse (Prelude.Maybe TxInMempool)

Instances

Instances details
Show WatchMempoolResponse Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

NFData WatchMempoolResponse Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Methods

rnf :: WatchMempoolResponse -> () #

Eq WatchMempoolResponse Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Ord WatchMempoolResponse Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

Message WatchMempoolResponse Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

HasField WatchMempoolResponse "tx" TxInMempool Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit

HasField WatchMempoolResponse "maybe'tx" (Maybe TxInMempool) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Submit.Submit