{-# LANGUAGE FlexibleContexts #-}
{-# LANGUAGE OverloadedStrings #-}
module Network.Ethereum.Api.Net where
import Data.Text (Text)
import Network.Ethereum.Api.Types (Quantity)
import Network.JsonRpc.TinyClient (JsonRpc (..))
version :: JsonRpc m => m Text
{-# INLINE version #-}
version :: m Text
version = Text -> m Text
forall (m :: * -> *) a. (JsonRpc m, Remote m a) => Text -> a
remote Text
"net_version"
listening :: JsonRpc m => m Bool
{-# INLINE listening #-}
listening :: m Bool
listening = Text -> m Bool
forall (m :: * -> *) a. (JsonRpc m, Remote m a) => Text -> a
remote Text
"net_listening"
peerCount :: JsonRpc m => m Quantity
{-# INLINE peerCount #-}
peerCount :: m Quantity
peerCount = Text -> m Quantity
forall (m :: * -> *) a. (JsonRpc m, Remote m a) => Text -> a
remote Text
"net_peerCount"