module Network.Ipfs.Api.Bitswap where
import Control.Monad.IO.Class (MonadIO (..))
import Data.Text (Text)
import Network.Ipfs.Api.Internal (_bitswapLedger,
_bitswapReprovide,
_bitswapStat, _bitswapWL)
import Network.Ipfs.Api.Internal.Call (call)
import Network.Ipfs.Api.Types (BitswapLedgerObj,
BitswapStatObj, BitswapWLObj,
ReprovideReturnType)
import Network.Ipfs.Client (IpfsT)
stat :: MonadIO m => IpfsT m BitswapStatObj
stat :: IpfsT m BitswapStatObj
stat = ClientM BitswapStatObj -> IpfsT m BitswapStatObj
forall (m :: * -> *) a. MonadIO m => ClientM a -> IpfsT m a
call ClientM BitswapStatObj
_bitswapStat
wl :: MonadIO m => IpfsT m BitswapWLObj
wl :: IpfsT m BitswapWLObj
wl = ClientM BitswapWLObj -> IpfsT m BitswapWLObj
forall (m :: * -> *) a. MonadIO m => ClientM a -> IpfsT m a
call ClientM BitswapWLObj
_bitswapWL
ledger :: MonadIO m => Text -> IpfsT m BitswapLedgerObj
ledger :: Text -> IpfsT m BitswapLedgerObj
ledger = ClientM BitswapLedgerObj -> IpfsT m BitswapLedgerObj
forall (m :: * -> *) a. MonadIO m => ClientM a -> IpfsT m a
call (ClientM BitswapLedgerObj -> IpfsT m BitswapLedgerObj)
-> (Text -> ClientM BitswapLedgerObj)
-> Text
-> IpfsT m BitswapLedgerObj
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Text -> ClientM BitswapLedgerObj
_bitswapLedger
reprovide :: MonadIO m => IpfsT m ReprovideReturnType
reprovide :: IpfsT m Text
reprovide = ClientM Text -> IpfsT m Text
forall (m :: * -> *) a. MonadIO m => ClientM a -> IpfsT m a
call ClientM Text
_bitswapReprovide