{-# LANGUAGE FlexibleContexts #-}
{-# LANGUAGE OverloadedStrings #-}
module Network.Polkadot.Api.Childstate where
import Data.ByteArray.HexString (HexString)
import Network.JsonRpc.TinyClient (JsonRpc (..))
getKeys :: JsonRpc m
=> HexString
-> HexString
-> Maybe HexString
-> m [HexString]
{-# INLINE getKeys #-}
getKeys = remote "childstate_getKeys"
getStorage :: JsonRpc m
=> HexString
-> HexString
-> Maybe HexString
-> m (Maybe HexString)
{-# INLINE getStorage #-}
getStorage = remote "childstate_getStorage"
getStorageHash :: JsonRpc m
=> HexString
-> HexString
-> Maybe HexString
-> m (Maybe HexString)
{-# INLINE getStorageHash #-}
getStorageHash = remote "childstate_getStorageHash"
getStorageSize :: JsonRpc m
=> HexString
-> HexString
-> Maybe HexString
-> m (Maybe Int)
{-# INLINE getStorageSize #-}
getStorageSize = remote "childstate_getStorageSize"