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

Servant.Hateoas.Combinator.Title

Synopsis

Documentation

data Title (sym :: Symbol) Source #

Combinator similar to Summary and Description but for the human readable title of the resource a RelationLink refers to.

Instances

Instances details
HasLink b => HasLink (Title sym :> b :: Type) Source # 
Instance details

Defined in Servant.Hateoas.Combinator.Title

Associated Types

type MkLink (Title sym :> b) a #

Methods

toLink :: (Link -> a) -> Proxy (Title sym :> b) -> Link -> MkLink (Title sym :> b) a #

HasHandler api => HasHandler (Title desc :> api :: Type) Source # 
Instance details

Defined in Servant.Hateoas.Combinator.Title

Methods

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

(KnownSymbol title, RightLink api) => HasRelationLink (Title title :> api :: Type) Source # 
Instance details

Defined in Servant.Hateoas.Combinator.Title

Methods

toRelationLink :: Proxy (Title title :> api) -> MkLink (Title title :> api) RelationLink Source #

(KnownSymbol title, HasTemplatedLink api) => HasTemplatedLink (Title title :> api :: Type) Source # 
Instance details

Defined in Servant.Hateoas.Combinator.Title

Methods

toTemplatedLink :: Proxy (Title title :> api) -> RelationLink Source #

HasServer api ctx => HasServer (Title desc :> api :: Type) ctx Source # 
Instance details

Defined in Servant.Hateoas.Combinator.Title

Associated Types

type ServerT (Title desc :> api) m #

Methods

route :: Proxy (Title desc :> api) -> Context ctx -> Delayed env (Server (Title desc :> api)) -> Router env #

hoistServerWithContext :: Proxy (Title desc :> api) -> Proxy ctx -> (forall x. m x -> n x) -> ServerT (Title desc :> api) m -> ServerT (Title desc :> api) n #

type MkLink (Title sym :> b :: Type) link Source # 
Instance details

Defined in Servant.Hateoas.Combinator.Title

type MkLink (Title sym :> b :: Type) link = MkLink b link
type ServerT (Title desc :> api :: Type) m Source # 
Instance details

Defined in Servant.Hateoas.Combinator.Title

type ServerT (Title desc :> api :: Type) m = ServerT api m