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

Proto.Utxorpc.V1alpha.Query.Query

Synopsis

Documentation

data QueryService Source #

Constructors

QueryService 

Instances

Instances details
Service QueryService Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

HasMethodImpl QueryService "readParams" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Associated Types

type MethodName QueryService "readParams" :: Symbol #

type MethodInput QueryService "readParams" #

type MethodOutput QueryService "readParams" #

type MethodStreamingType QueryService "readParams" :: StreamingType #

HasMethodImpl QueryService "readUtxos" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Associated Types

type MethodName QueryService "readUtxos" :: Symbol #

type MethodInput QueryService "readUtxos" #

type MethodOutput QueryService "readUtxos" #

type MethodStreamingType QueryService "readUtxos" :: StreamingType #

HasMethodImpl QueryService "searchUtxos" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Associated Types

type MethodName QueryService "searchUtxos" :: Symbol #

type MethodInput QueryService "searchUtxos" #

type MethodOutput QueryService "searchUtxos" #

type MethodStreamingType QueryService "searchUtxos" :: StreamingType #

HasMethodImpl QueryService "streamUtxos" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Associated Types

type MethodName QueryService "streamUtxos" :: Symbol #

type MethodInput QueryService "streamUtxos" #

type MethodOutput QueryService "streamUtxos" #

type MethodStreamingType QueryService "streamUtxos" :: StreamingType #

type ServiceMethods QueryService Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

type ServiceMethods QueryService = '["readParams", "readUtxos", "searchUtxos", "streamUtxos"]
type ServiceName QueryService Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

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

Defined in Proto.Utxorpc.V1alpha.Query.Query

type ServicePackage QueryService = "utxorpc.v1alpha.query"
type MethodInput QueryService "readParams" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

type MethodInput QueryService "readUtxos" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

type MethodInput QueryService "searchUtxos" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

type MethodInput QueryService "streamUtxos" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

type MethodName QueryService "readParams" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

type MethodName QueryService "readParams" = "ReadParams"
type MethodName QueryService "readUtxos" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

type MethodName QueryService "readUtxos" = "ReadUtxos"
type MethodName QueryService "searchUtxos" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

type MethodName QueryService "searchUtxos" = "SearchUtxos"
type MethodName QueryService "streamUtxos" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

type MethodName QueryService "streamUtxos" = "StreamUtxos"
type MethodOutput QueryService "readParams" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

type MethodOutput QueryService "readUtxos" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

type MethodOutput QueryService "searchUtxos" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

type MethodOutput QueryService "streamUtxos" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

type MethodStreamingType QueryService "readParams" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

type MethodStreamingType QueryService "readUtxos" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

type MethodStreamingType QueryService "searchUtxos" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

type MethodStreamingType QueryService "streamUtxos" Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

data AnyChainParams Source #

Fields :

  • maybe'params :: Lens' AnyChainParams (Prelude.Maybe AnyChainParams'Params)
  • maybe'cardano :: Lens' AnyChainParams (Prelude.Maybe Proto.Utxorpc.V1alpha.Cardano.Cardano.Params)
  • cardano :: Lens' AnyChainParams Proto.Utxorpc.V1alpha.Cardano.Cardano.Params

Instances

Instances details
Show AnyChainParams Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

NFData AnyChainParams Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

rnf :: AnyChainParams -> () #

Eq AnyChainParams Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Ord AnyChainParams Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Message AnyChainParams Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

HasField AnyChainParams "cardano" Params Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

fieldOf :: Functor f => Proxy# "cardano" -> (Params -> f Params) -> AnyChainParams -> f AnyChainParams #

HasField ReadParamsResponse "values" AnyChainParams Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

HasField AnyChainParams "maybe'cardano" (Maybe Params) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

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

HasField AnyChainParams "maybe'params" (Maybe AnyChainParams'Params) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

HasField ReadParamsResponse "maybe'values" (Maybe AnyChainParams) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

data AnyChainParams'Params Source #

Instances

Instances details
Show AnyChainParams'Params Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

NFData AnyChainParams'Params Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

rnf :: AnyChainParams'Params -> () #

Eq AnyChainParams'Params Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Ord AnyChainParams'Params Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

HasField AnyChainParams "maybe'params" (Maybe AnyChainParams'Params) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

data AnyUtxoData Source #

Fields :

  • txoRef :: Lens' AnyUtxoData TxoRef
  • maybe'txoRef :: Lens' AnyUtxoData (Prelude.Maybe TxoRef)
  • nativeBytes :: Lens' AnyUtxoData Data.ByteString.ByteString
  • maybe'parsedState :: Lens' AnyUtxoData (Prelude.Maybe AnyUtxoData'ParsedState)
  • maybe'cardano :: Lens' AnyUtxoData (Prelude.Maybe Proto.Utxorpc.V1alpha.Cardano.Cardano.TxOutput)
  • cardano :: Lens' AnyUtxoData Proto.Utxorpc.V1alpha.Cardano.Cardano.TxOutput

Instances

Instances details
Show AnyUtxoData Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

NFData AnyUtxoData Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

rnf :: AnyUtxoData -> () #

Eq AnyUtxoData Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Ord AnyUtxoData Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Message AnyUtxoData Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

HasField AnyUtxoData "cardano" TxOutput Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

fieldOf :: Functor f => Proxy# "cardano" -> (TxOutput -> f TxOutput) -> AnyUtxoData -> f AnyUtxoData #

HasField AnyUtxoData "nativeBytes" ByteString Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

fieldOf :: Functor f => Proxy# "nativeBytes" -> (ByteString -> f ByteString) -> AnyUtxoData -> f AnyUtxoData #

HasField AnyUtxoData "txoRef" TxoRef Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

fieldOf :: Functor f => Proxy# "txoRef" -> (TxoRef -> f TxoRef) -> AnyUtxoData -> f AnyUtxoData #

HasField AnyUtxoData "maybe'cardano" (Maybe TxOutput) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

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

HasField AnyUtxoData "maybe'parsedState" (Maybe AnyUtxoData'ParsedState) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

HasField AnyUtxoData "maybe'txoRef" (Maybe TxoRef) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

fieldOf :: Functor f => Proxy# "maybe'txoRef" -> (Maybe TxoRef -> f (Maybe TxoRef)) -> AnyUtxoData -> f AnyUtxoData #

HasField ReadUtxosResponse "items" [AnyUtxoData] Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

fieldOf :: Functor f => Proxy# "items" -> ([AnyUtxoData] -> f [AnyUtxoData]) -> ReadUtxosResponse -> f ReadUtxosResponse #

HasField ReadUtxosResponse "vec'items" (Vector AnyUtxoData) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

HasField SearchUtxosResponse "items" [AnyUtxoData] Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

HasField SearchUtxosResponse "vec'items" (Vector AnyUtxoData) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

data AnyUtxoData'ParsedState Source #

Instances

Instances details
Show AnyUtxoData'ParsedState Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

NFData AnyUtxoData'ParsedState Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

rnf :: AnyUtxoData'ParsedState -> () #

Eq AnyUtxoData'ParsedState Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Ord AnyUtxoData'ParsedState Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

HasField AnyUtxoData "maybe'parsedState" (Maybe AnyUtxoData'ParsedState) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

data AnyUtxoPattern Source #

Fields :

  • maybe'utxoPattern :: Lens' AnyUtxoPattern (Prelude.Maybe AnyUtxoPattern'UtxoPattern)
  • maybe'cardano :: Lens' AnyUtxoPattern (Prelude.Maybe Proto.Utxorpc.V1alpha.Cardano.Cardano.TxOutputPattern)
  • cardano :: Lens' AnyUtxoPattern Proto.Utxorpc.V1alpha.Cardano.Cardano.TxOutputPattern

Instances

Instances details
Show AnyUtxoPattern Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

NFData AnyUtxoPattern Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

rnf :: AnyUtxoPattern -> () #

Eq AnyUtxoPattern Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Ord AnyUtxoPattern Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Message AnyUtxoPattern Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

HasField AnyUtxoPattern "cardano" TxOutputPattern Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

HasField UtxoPredicate "match" AnyUtxoPattern Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

HasField AnyUtxoPattern "maybe'cardano" (Maybe TxOutputPattern) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

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

HasField AnyUtxoPattern "maybe'utxoPattern" (Maybe AnyUtxoPattern'UtxoPattern) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

HasField UtxoPredicate "maybe'match" (Maybe AnyUtxoPattern) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

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

data AnyUtxoPattern'UtxoPattern Source #

Instances

Instances details
Show AnyUtxoPattern'UtxoPattern Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

NFData AnyUtxoPattern'UtxoPattern Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Eq AnyUtxoPattern'UtxoPattern Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Ord AnyUtxoPattern'UtxoPattern Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

HasField AnyUtxoPattern "maybe'utxoPattern" (Maybe AnyUtxoPattern'UtxoPattern) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

data ChainPoint Source #

Fields :

  • slot :: Lens' ChainPoint Data.Word.Word64
  • hash :: Lens' ChainPoint Data.ByteString.ByteString

Instances

Instances details
Show ChainPoint Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

NFData ChainPoint Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

rnf :: ChainPoint -> () #

Eq ChainPoint Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Ord ChainPoint Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Message ChainPoint Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

HasField ChainPoint "hash" ByteString Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

fieldOf :: Functor f => Proxy# "hash" -> (ByteString -> f ByteString) -> ChainPoint -> f ChainPoint #

HasField ChainPoint "slot" Word64 Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

fieldOf :: Functor f => Proxy# "slot" -> (Word64 -> f Word64) -> ChainPoint -> f ChainPoint #

HasField ReadParamsResponse "ledgerTip" ChainPoint Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

fieldOf :: Functor f => Proxy# "ledgerTip" -> (ChainPoint -> f ChainPoint) -> ReadParamsResponse -> f ReadParamsResponse #

HasField ReadUtxosResponse "ledgerTip" ChainPoint Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

fieldOf :: Functor f => Proxy# "ledgerTip" -> (ChainPoint -> f ChainPoint) -> ReadUtxosResponse -> f ReadUtxosResponse #

HasField SearchUtxosResponse "ledgerTip" ChainPoint Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

HasField ReadParamsResponse "maybe'ledgerTip" (Maybe ChainPoint) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

fieldOf :: Functor f => Proxy# "maybe'ledgerTip" -> (Maybe ChainPoint -> f (Maybe ChainPoint)) -> ReadParamsResponse -> f ReadParamsResponse #

HasField ReadUtxosResponse "maybe'ledgerTip" (Maybe ChainPoint) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

fieldOf :: Functor f => Proxy# "maybe'ledgerTip" -> (Maybe ChainPoint -> f (Maybe ChainPoint)) -> ReadUtxosResponse -> f ReadUtxosResponse #

HasField SearchUtxosResponse "maybe'ledgerTip" (Maybe ChainPoint) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

fieldOf :: Functor f => Proxy# "maybe'ledgerTip" -> (Maybe ChainPoint -> f (Maybe ChainPoint)) -> SearchUtxosResponse -> f SearchUtxosResponse #

data ReadParamsRequest Source #

Fields :

  • fieldMask :: Lens' ReadParamsRequest Proto.Google.Protobuf.FieldMask.FieldMask
  • maybe'fieldMask :: Lens' ReadParamsRequest (Prelude.Maybe Proto.Google.Protobuf.FieldMask.FieldMask)

Instances

Instances details
Show ReadParamsRequest Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

NFData ReadParamsRequest Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

rnf :: ReadParamsRequest -> () #

Eq ReadParamsRequest Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Ord ReadParamsRequest Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Message ReadParamsRequest Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

HasField ReadParamsRequest "fieldMask" FieldMask Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

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

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

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

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

data ReadParamsResponse Source #

Fields :

  • values :: Lens' ReadParamsResponse AnyChainParams
  • maybe'values :: Lens' ReadParamsResponse (Prelude.Maybe AnyChainParams)
  • ledgerTip :: Lens' ReadParamsResponse ChainPoint
  • maybe'ledgerTip :: Lens' ReadParamsResponse (Prelude.Maybe ChainPoint)

Instances

Instances details
Show ReadParamsResponse Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

NFData ReadParamsResponse Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

rnf :: ReadParamsResponse -> () #

Eq ReadParamsResponse Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Ord ReadParamsResponse Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Message ReadParamsResponse Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

HasField ReadParamsResponse "ledgerTip" ChainPoint Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

fieldOf :: Functor f => Proxy# "ledgerTip" -> (ChainPoint -> f ChainPoint) -> ReadParamsResponse -> f ReadParamsResponse #

HasField ReadParamsResponse "values" AnyChainParams Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

HasField ReadParamsResponse "maybe'ledgerTip" (Maybe ChainPoint) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

fieldOf :: Functor f => Proxy# "maybe'ledgerTip" -> (Maybe ChainPoint -> f (Maybe ChainPoint)) -> ReadParamsResponse -> f ReadParamsResponse #

HasField ReadParamsResponse "maybe'values" (Maybe AnyChainParams) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

data ReadUtxosRequest Source #

Fields :

  • keys :: Lens' ReadUtxosRequest [TxoRef]
  • vec'keys :: Lens' ReadUtxosRequest (Data.Vector.Vector TxoRef)

Instances

Instances details
Show ReadUtxosRequest Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

NFData ReadUtxosRequest Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

rnf :: ReadUtxosRequest -> () #

Eq ReadUtxosRequest Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Ord ReadUtxosRequest Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Message ReadUtxosRequest Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

HasField ReadUtxosRequest "keys" [TxoRef] Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

fieldOf :: Functor f => Proxy# "keys" -> ([TxoRef] -> f [TxoRef]) -> ReadUtxosRequest -> f ReadUtxosRequest #

HasField ReadUtxosRequest "vec'keys" (Vector TxoRef) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

fieldOf :: Functor f => Proxy# "vec'keys" -> (Vector TxoRef -> f (Vector TxoRef)) -> ReadUtxosRequest -> f ReadUtxosRequest #

data ReadUtxosResponse Source #

Fields :

  • items :: Lens' ReadUtxosResponse [AnyUtxoData]
  • vec'items :: Lens' ReadUtxosResponse (Data.Vector.Vector AnyUtxoData)
  • ledgerTip :: Lens' ReadUtxosResponse ChainPoint
  • maybe'ledgerTip :: Lens' ReadUtxosResponse (Prelude.Maybe ChainPoint)

Instances

Instances details
Show ReadUtxosResponse Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

NFData ReadUtxosResponse Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

rnf :: ReadUtxosResponse -> () #

Eq ReadUtxosResponse Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Ord ReadUtxosResponse Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Message ReadUtxosResponse Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

HasField ReadUtxosResponse "ledgerTip" ChainPoint Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

fieldOf :: Functor f => Proxy# "ledgerTip" -> (ChainPoint -> f ChainPoint) -> ReadUtxosResponse -> f ReadUtxosResponse #

HasField ReadUtxosResponse "items" [AnyUtxoData] Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

fieldOf :: Functor f => Proxy# "items" -> ([AnyUtxoData] -> f [AnyUtxoData]) -> ReadUtxosResponse -> f ReadUtxosResponse #

HasField ReadUtxosResponse "maybe'ledgerTip" (Maybe ChainPoint) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

fieldOf :: Functor f => Proxy# "maybe'ledgerTip" -> (Maybe ChainPoint -> f (Maybe ChainPoint)) -> ReadUtxosResponse -> f ReadUtxosResponse #

HasField ReadUtxosResponse "vec'items" (Vector AnyUtxoData) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

data SearchUtxosRequest Source #

Fields :

  • predicate :: Lens' SearchUtxosRequest UtxoPredicate
  • maybe'predicate :: Lens' SearchUtxosRequest (Prelude.Maybe UtxoPredicate)

Instances

Instances details
Show SearchUtxosRequest Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

NFData SearchUtxosRequest Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

rnf :: SearchUtxosRequest -> () #

Eq SearchUtxosRequest Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Ord SearchUtxosRequest Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Message SearchUtxosRequest Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

HasField SearchUtxosRequest "predicate" UtxoPredicate Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

HasField SearchUtxosRequest "maybe'predicate" (Maybe UtxoPredicate) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

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

data SearchUtxosResponse Source #

Fields :

  • items :: Lens' SearchUtxosResponse [AnyUtxoData]
  • vec'items :: Lens' SearchUtxosResponse (Data.Vector.Vector AnyUtxoData)
  • ledgerTip :: Lens' SearchUtxosResponse ChainPoint
  • maybe'ledgerTip :: Lens' SearchUtxosResponse (Prelude.Maybe ChainPoint)

Instances

Instances details
Show SearchUtxosResponse Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

NFData SearchUtxosResponse Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

rnf :: SearchUtxosResponse -> () #

Eq SearchUtxosResponse Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Ord SearchUtxosResponse Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Message SearchUtxosResponse Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

HasField SearchUtxosResponse "ledgerTip" ChainPoint Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

HasField SearchUtxosResponse "items" [AnyUtxoData] Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

HasField SearchUtxosResponse "maybe'ledgerTip" (Maybe ChainPoint) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

fieldOf :: Functor f => Proxy# "maybe'ledgerTip" -> (Maybe ChainPoint -> f (Maybe ChainPoint)) -> SearchUtxosResponse -> f SearchUtxosResponse #

HasField SearchUtxosResponse "vec'items" (Vector AnyUtxoData) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

data TxoRef Source #

Fields :

  • hash :: Lens' TxoRef Data.ByteString.ByteString
  • index :: Lens' TxoRef Data.Word.Word32

Instances

Instances details
Show TxoRef Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

NFData TxoRef Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

rnf :: TxoRef -> () #

Eq TxoRef Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

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

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

Ord TxoRef Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Message TxoRef Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

HasField AnyUtxoData "txoRef" TxoRef Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

fieldOf :: Functor f => Proxy# "txoRef" -> (TxoRef -> f TxoRef) -> AnyUtxoData -> f AnyUtxoData #

HasField TxoRef "hash" ByteString Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

fieldOf :: Functor f => Proxy# "hash" -> (ByteString -> f ByteString) -> TxoRef -> f TxoRef #

HasField TxoRef "index" Word32 Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

fieldOf :: Functor f => Proxy# "index" -> (Word32 -> f Word32) -> TxoRef -> f TxoRef #

HasField AnyUtxoData "maybe'txoRef" (Maybe TxoRef) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

fieldOf :: Functor f => Proxy# "maybe'txoRef" -> (Maybe TxoRef -> f (Maybe TxoRef)) -> AnyUtxoData -> f AnyUtxoData #

HasField ReadUtxosRequest "keys" [TxoRef] Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

fieldOf :: Functor f => Proxy# "keys" -> ([TxoRef] -> f [TxoRef]) -> ReadUtxosRequest -> f ReadUtxosRequest #

HasField ReadUtxosRequest "vec'keys" (Vector TxoRef) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

fieldOf :: Functor f => Proxy# "vec'keys" -> (Vector TxoRef -> f (Vector TxoRef)) -> ReadUtxosRequest -> f ReadUtxosRequest #

data UtxoPredicate Source #

Fields :

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

Instances

Instances details
Show UtxoPredicate Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

NFData UtxoPredicate Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

rnf :: UtxoPredicate -> () #

Eq UtxoPredicate Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Ord UtxoPredicate Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Message UtxoPredicate Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

HasField SearchUtxosRequest "predicate" UtxoPredicate Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

HasField UtxoPredicate "match" AnyUtxoPattern Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

HasField SearchUtxosRequest "maybe'predicate" (Maybe UtxoPredicate) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

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

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

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

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

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

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

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

HasField UtxoPredicate "maybe'match" (Maybe AnyUtxoPattern) Source # 
Instance details

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

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

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

Defined in Proto.Utxorpc.V1alpha.Query.Query

Methods

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

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

Defined in Proto.Utxorpc.V1alpha.Query.Query

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

Defined in Proto.Utxorpc.V1alpha.Query.Query

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

Defined in Proto.Utxorpc.V1alpha.Query.Query