msgpack-rpc-conduit-0.0.6: A MessagePack-RPC Implementation
Safe HaskellSafe-Inferred
LanguageHaskell2010

Network.MessagePack.Types

Synopsis

Documentation

type Request ix = (Int, Int, ix, [Object]) Source #

packRequest :: (Eq mth, MessagePack mth) => [mth] -> Request mth -> ByteString Source #

class Monad m => MethodType m f where Source #

Methods

toBody :: Text -> f -> [Object] -> m Object Source #

Create a RPC method from a Haskell function

Instances

Instances details
(Functor m, MonadThrow m, MessagePack o) => MethodType m (ServerT m o) Source # 
Instance details

Defined in Network.MessagePack.Server.Basic

Methods

toBody :: Text -> ServerT m o -> [Object] -> m Object Source #

(MonadThrow m, MessagePack o, MethodType m r) => MethodType m (o -> r) Source # 
Instance details

Defined in Network.MessagePack.Server.Basic

Methods

toBody :: Text -> (o -> r) -> [Object] -> m Object Source #

data Method m Source #

Constructors

Method 

method Source #

Arguments

:: MethodType m f 
=> Text

Method name

-> MethodDocs 
-> f

Method body

-> Method m 

Build a method

class RpcType r where Source #

Methods

rpcc :: Text -> [Object] -> r Source #

Instances

Instances details
(MessagePack o, RpcType r) => RpcType (o -> r) Source # 
Instance details

Defined in Network.MessagePack.Types.Client

Methods

rpcc :: Text -> [Object] -> o -> r Source #

(MonadIO m, MonadThrow m, MessagePack o) => RpcType (ClientT m o) Source # 
Instance details

Defined in Network.MessagePack.Client.Internal

Methods

rpcc :: Text -> [Object] -> ClientT m o Source #

call :: RpcType a => Text -> a Source #

Call an RPC Method