rpc-framework-0.1.0.0: a remote procedure call framework

Safe HaskellNone

Network.Remote.RPC.Internal.Runtime

Synopsis

Documentation

data WIO w m a Source

Instances

(Sendable m a' a, Sendable m b b') => Sendable m (a -> b) (a' -> WIO w m b') 
MonadTrans (WIO w) 
Monad m => Monad (WIO w m) 
Functor m => Functor (WIO w m) 
MonadIO m => MonadIO (WIO w m) 
Forkable m => Forkable (WIO w m) 
Servable m => Servable (WIO w m) 
(Host w, Servable m, Sendable m a a') => Service (WIO w m a) m w 
(Sendable m' a a', Host w, Host w', Servable m, Servable m') => RPC (WIO w m a) (WIO w' m' a') m' w' 

world :: forall w m. (Servable m, Host w) => WIO w m wSource

realRemoteCall :: forall a a' w m. RPC a a' m w => a -> String -> a'Source

makeService :: Service a m w => a -> String -> WIO w m ()Source

class Servable m => Sendable m a a' | a' -> a, a m -> a', a a' -> mSource

Instances

(Read a, Show a', ~ * a a', Servable m) => Sendable m a a' 
(Sendable m a' a, Sendable m b b') => Sendable m (a -> b) (a' -> WIO w m b') 

data Ref a a' Source

Instances

Read (Ref a a') 
Show (Ref a a') 

liftIO :: MonadIO m => forall a. IO a -> m a

Lift a computation from the IO monad.

runServer :: forall w m. (Servable m, Host w) => WIO w m () -> m ()Source

runServer runs a name server and doesn't return

runServerBG :: Host w => WIO w IO () -> IO ThreadIdSource

runServerBG runs a name server on a background thread and does return