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

Morley.Client.Full

Description

Implementation of full-featured Morley client.

Synopsis

Documentation

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 -> Address -> 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 -> Address -> MorleyClientM OriginationScript Source #

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

getContractBigMapAtBlock :: BlockId -> Address -> 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 -> Address -> MorleyClientM (Maybe KeyHash) Source #

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

getChainId :: MorleyClientM ChainId Source #

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

waitForOperation :: MorleyClientM OperationHash -> MorleyClientM OperationHash Source #

HasTezosClient MorleyClientM Source # 
Instance details

Defined in Morley.Client.Full

Methods

signBytes :: AddressOrAlias -> Maybe ScrubbedBytes -> ByteString -> MorleyClientM Signature Source #

genKey :: Alias -> MorleyClientM Address Source #

genFreshKey :: Alias -> MorleyClientM Address Source #

revealKey :: Alias -> Maybe ScrubbedBytes -> MorleyClientM () Source #

rememberContract :: Bool -> Address -> Alias -> MorleyClientM () Source #

importKey :: Bool -> Alias -> SecretKey -> MorleyClientM Alias Source #

resolveAddressMaybe :: AddressOrAlias -> MorleyClientM (Maybe Address) Source #

getAlias :: AddressOrAlias -> MorleyClientM Alias Source #

getPublicKey :: AddressOrAlias -> MorleyClientM PublicKey Source #

getSecretKey :: AddressOrAlias -> MorleyClientM SecretKey Source #

registerDelegate :: Alias -> Maybe ScrubbedBytes -> MorleyClientM () Source #

getTezosClientConfig :: MorleyClientM TezosClientConfig Source #

calcTransferFee :: AddressOrAlias -> Maybe ScrubbedBytes -> TezosInt64 -> [CalcTransferFeeData] -> MorleyClientM [TezosMutez] Source #

calcOriginationFee :: forall (st :: T) (cp :: T). UntypedValScope st => CalcOriginationFeeData cp st -> MorleyClientM TezosMutez Source #

getKeyPassword :: Address -> MorleyClientM (Maybe ScrubbedBytes) Source #

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.