servant-server-0.18.2: A family of combinators for defining webservices APIs and serving them
Safe HaskellNone
LanguageHaskell2010

Servant.Server.UVerb

Synopsis

Documentation

respond :: forall (x :: *) (xs :: [*]) (f :: * -> *). (Applicative f, HasStatus x, IsMember x xs) => x -> f (Union xs) Source #

return for UVerb handlers. Takes a value of any of the members of the open union, and will construct a union value in an Applicative (eg. Server).

type IsServerResource contentTypes = AllCTRender contentTypes `And` HasStatus Source #

Helper constraint used in instance HasServer UVerb.

Orphan instances

(ReflectMethod method, AllMime contentTypes, All (IsServerResource contentTypes) as, Unique (Statuses as)) => HasServer (UVerb method contentTypes as :: Type) context Source # 
Instance details

Associated Types

type ServerT (UVerb method contentTypes as) m Source #

Methods

route :: Proxy (UVerb method contentTypes as) -> Context context -> Delayed env (Server (UVerb method contentTypes as)) -> Router env Source #

hoistServerWithContext :: Proxy (UVerb method contentTypes as) -> Proxy context -> (forall x. m x -> n x) -> ServerT (UVerb method contentTypes as) m -> ServerT (UVerb method contentTypes as) n Source #