servant-auth-token-0.5.4.0: Servant based API and server for token based authorisation

Safe HaskellNone
LanguageHaskell2010

Servant.Server.Auth.Token.Combinator

Synopsis

Documentation

data AuthPerm (perms :: [Symbol]) Source #

An authentication combinator.

TODO maybe move in the servant-auth-api library

Instances
(HasServer api context, PermsList (PlainPerms perms), HasContextEntry context AuthAction) => HasServer (AuthPerm perms :> api :: *) context Source # 
Instance details

Defined in Servant.Server.Auth.Token.Combinator

Associated Types

type ServerT (AuthPerm perms :> api) m :: * #

Methods

route :: Proxy (AuthPerm perms :> api) -> Context context -> Delayed env (Server (AuthPerm perms :> api)) -> Router env #

hoistServerWithContext :: Proxy (AuthPerm perms :> api) -> Proxy context -> (forall x. m x -> n x) -> ServerT (AuthPerm perms :> api) m -> ServerT (AuthPerm perms :> api) n #

type ServerT (AuthPerm perms :> api :: *) m Source # 
Instance details

Defined in Servant.Server.Auth.Token.Combinator

type ServerT (AuthPerm perms :> api :: *) m = ServerT api m

newtype AuthAction Source #

An authentication handler.

Constructors

AuthAction