servant-hateoas-0.3.1: HATEOAS extension for servant
Safe HaskellSafe-Inferred
LanguageGHC2021

Servant.Hateoas.HasHandler

Contents

Synopsis

Class

class HasHandler api where Source #

Typeclass for extracting the handler of an API.

Methods

getHandler :: MonadIO m => Proxy m -> Proxy api -> ServerT api m Source #

Instances

Instances details
HasHandler EmptyAPI Source # 
Instance details

Defined in Servant.Hateoas.HasHandler

Methods

getHandler :: forall (m :: Type -> Type). MonadIO m => Proxy m -> Proxy EmptyAPI -> ServerT EmptyAPI m Source #

(HasHandler a, HasHandler b) => HasHandler (a :<|> b :: Type) Source # 
Instance details

Defined in Servant.Hateoas.HasHandler

Methods

getHandler :: forall (m :: Type -> Type). MonadIO m => Proxy m -> Proxy (a :<|> b) -> ServerT (a :<|> b) m Source #

HasHandler b => HasHandler (a :> b :: Type) Source # 
Instance details

Defined in Servant.Hateoas.HasHandler

Methods

getHandler :: forall (m :: Type -> Type). MonadIO m => Proxy m -> Proxy (a :> b) -> ServerT (a :> b) m Source #

HasHandler b => HasHandler (Description sym :> b :: Type) Source # 
Instance details

Defined in Servant.Hateoas.HasHandler

Methods

getHandler :: forall (m :: Type -> Type). MonadIO m => Proxy m -> Proxy (Description sym :> b) -> ServerT (Description sym :> b) m Source #

HasHandler b => HasHandler (Summary sym :> b :: Type) Source # 
Instance details

Defined in Servant.Hateoas.HasHandler

Methods

getHandler :: forall (m :: Type -> Type). MonadIO m => Proxy m -> Proxy (Summary sym :> b) -> ServerT (Summary sym :> b) m Source #

HasHandler b => HasHandler (Fragment a :> b :: Type) Source # 
Instance details

Defined in Servant.Hateoas.HasHandler

Methods

getHandler :: forall (m :: Type -> Type). MonadIO m => Proxy m -> Proxy (Fragment a :> b) -> ServerT (Fragment a :> b) m Source #

(HasHandler api, KnownSymbol sym) => HasHandler (Sym sym :> api :: Type) Source # 
Instance details

Defined in Servant.Hateoas.Internal.Sym

Methods

getHandler :: forall (m :: Type -> Type). MonadIO m => Proxy m -> Proxy (Sym sym :> api) -> ServerT (Sym sym :> api) m Source #