servant-auth-token-0.5.2.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 # 

Associated Types

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

Methods

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

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

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

newtype AuthAction Source #

An authentication handler.

Constructors

AuthAction