servant-streaming-server-0.2.0.0: Server instances for the 'servant-streaming' package.

Safe HaskellNone
LanguageHaskell2010

Servant.Streaming.Server.Internal

Contents

Documentation

Orphan instances

(KnownNat status, AllMime contentTypes, ReflectMethod StdMethod method) => HasServer * (StreamResponse method status contentTypes) ctx Source # 

Associated Types

type ServerT (StreamResponse method status contentTypes) (ctx :: StreamResponse method status contentTypes) (m :: * -> *) :: * #

Methods

route :: Proxy (StreamResponse method status contentTypes) ctx -> Context context -> Delayed env (Server (StreamResponse method status contentTypes) ctx) -> Router env #

hoistServerWithContext :: Proxy (StreamResponse method status contentTypes) ctx -> Proxy [*] context -> (forall x. m x -> n x) -> ServerT (StreamResponse method status contentTypes) ctx m -> ServerT (StreamResponse method status contentTypes) ctx n #

(AllMime contentTypes, HasServer * subapi ctx, MonadIO n) => HasServer * ((:>) * * (StreamBodyMonad contentTypes n) subapi) ctx Source # 

Associated Types

type ServerT ((* :> *) (StreamBodyMonad contentTypes n) subapi) (ctx :: (* :> *) (StreamBodyMonad contentTypes n) subapi) (m :: * -> *) :: * #

Methods

route :: Proxy ((* :> *) (StreamBodyMonad contentTypes n) subapi) ctx -> Context context -> Delayed env (Server ((* :> *) (StreamBodyMonad contentTypes n) subapi) ctx) -> Router env #

hoistServerWithContext :: Proxy ((* :> *) (StreamBodyMonad contentTypes n) subapi) ctx -> Proxy [*] context -> (forall x. m x -> n x) -> ServerT ((* :> *) (StreamBodyMonad contentTypes n) subapi) ctx m -> ServerT ((* :> *) (StreamBodyMonad contentTypes n) subapi) ctx n #