morley-client-0.3.1: Client to interact with the Tezos blockchain
Safe HaskellSafe-Inferred
LanguageHaskell2010

Morley.Client.Full

Contents

Description

Implementation of full-featured Morley client.

Synopsis

Documentation

data MorleyClientConfig Source #

Data necessary for morley client initialization.

Constructors

MorleyClientConfig 

Fields

Instances

Instances details
Show MorleyClientConfig Source # 
Instance details

Defined in Morley.Client.Init

data MorleyClientM a Source #

Instances

Instances details
MonadIO MorleyClientM Source # 
Instance details

Defined in Morley.Client.Full

Methods

liftIO :: IO a -> MorleyClientM a #

Applicative MorleyClientM Source # 
Instance details

Defined in Morley.Client.Full

Functor MorleyClientM Source # 
Instance details

Defined in Morley.Client.Full

Methods

fmap :: (a -> b) -> MorleyClientM a -> MorleyClientM b #

(<$) :: a -> MorleyClientM b -> MorleyClientM a #

Monad MorleyClientM Source # 
Instance details

Defined in Morley.Client.Full

MonadCatch MorleyClientM Source # 
Instance details

Defined in Morley.Client.Full

Methods

catch :: Exception e => MorleyClientM a -> (e -> MorleyClientM a) -> MorleyClientM a #

MonadMask MorleyClientM Source # 
Instance details

Defined in Morley.Client.Full

MonadThrow MorleyClientM Source # 
Instance details

Defined in Morley.Client.Full

Methods

throwM :: Exception e => e -> MorleyClientM a #

HasTezosRpc MorleyClientM Source # 
Instance details

Defined in Morley.Client.Full

Methods

getBlockHash :: BlockId -> MorleyClientM BlockHash Source #

getCounterAtBlock :: BlockId -> ImplicitAddress -> MorleyClientM TezosInt64 Source #

getBlockHeader :: BlockId -> MorleyClientM BlockHeader Source #

getScriptSizeAtBlock :: BlockId -> CalcSize -> MorleyClientM ScriptSize Source #

getBlockConstants :: BlockId -> MorleyClientM BlockConstants Source #

getBlockOperations :: BlockId -> MorleyClientM [[BlockOperation]] Source #

getBlockOperationHashes :: BlockId -> MorleyClientM [[OperationHash]] Source #

getProtocolParametersAtBlock :: BlockId -> MorleyClientM ProtocolParameters Source #

runOperationAtBlock :: BlockId -> RunOperation -> MorleyClientM RunOperationResult Source #

preApplyOperationsAtBlock :: BlockId -> [PreApplyOperation] -> MorleyClientM [RunOperationResult] Source #

forgeOperationAtBlock :: BlockId -> ForgeOperation -> MorleyClientM HexJSONByteString Source #

injectOperation :: HexJSONByteString -> MorleyClientM OperationHash Source #

getContractScriptAtBlock :: BlockId -> ContractAddress -> MorleyClientM OriginationScript Source #

getContractStorageAtBlock :: BlockId -> ContractAddress -> MorleyClientM Expression Source #

getContractBigMapAtBlock :: BlockId -> ContractAddress -> GetBigMap -> MorleyClientM GetBigMapResult Source #

getBigMapValueAtBlock :: BlockId -> Natural -> Text -> MorleyClientM Expression Source #

getBigMapValuesAtBlock :: BlockId -> Natural -> Maybe Natural -> Maybe Natural -> MorleyClientM Expression Source #

getBalanceAtBlock :: BlockId -> Address -> MorleyClientM Mutez Source #

getDelegateAtBlock :: BlockId -> L1Address -> MorleyClientM (Maybe KeyHash) Source #

runCodeAtBlock :: BlockId -> RunCode -> MorleyClientM RunCodeResult Source #

getChainId :: MorleyClientM ChainId Source #

getManagerKeyAtBlock :: BlockId -> ImplicitAddress -> MorleyClientM (Maybe PublicKey) Source #

waitForOperation :: MorleyClientM OperationHash -> MorleyClientM OperationHash Source #

getTicketBalanceAtBlock :: BlockId -> Address -> GetTicketBalance -> MorleyClientM Natural Source #

getAllTicketBalancesAtBlock :: BlockId -> ContractAddress -> MorleyClientM [GetAllTicketBalancesResponse] Source #

HasTezosClient MorleyClientM Source # 
Instance details

Defined in Morley.Client.Full

RunClient MorleyClientM Source # 
Instance details

Defined in Morley.Client.Full

MonadUnliftIO MorleyClientM Source # 
Instance details

Defined in Morley.Client.Full

Methods

withRunInIO :: ((forall a. MorleyClientM a -> IO a) -> IO b) -> MorleyClientM b #

MonadReader MorleyClientEnv MorleyClientM Source # 
Instance details

Defined in Morley.Client.Full

HasLog MorleyClientEnv Message MorleyClientM Source # 
Instance details

Defined in Morley.Client.Full

runMorleyClientM :: MorleyClientEnv -> MorleyClientM a -> IO a Source #

Run MorleyClientM action within given MorleyClientEnv. Retry action in case of invalid counter error.

mkMorleyClientEnv :: MorleyClientConfig -> IO MorleyClientEnv Source #

Construct MorleyClientEnv.

mkLogAction :: MonadIO m => Word -> ClientLogAction m Source #

Make appropriate ClientLogAction based on verbosity specified by the user.

Lens