Safe Haskell | None |
---|---|
Language | Haskell2010 |
Synopsis
- type family AuthServerData a :: *
- newtype AuthHandler r usr = AuthHandler {
- unAuthHandler :: r -> Handler usr
- mkAuthHandler :: (r -> Handler usr) -> AuthHandler r usr
General Auth
type family AuthServerData a :: * Source #
Specify the type of data returned after we've authenticated a request.
quite often this is some User
datatype.
NOTE: THIS API IS EXPERIMENTAL AND SUBJECT TO CHANGE
newtype AuthHandler r usr Source #
Handlers for AuthProtected resources
NOTE: THIS API IS EXPERIMENTAL AND SUBJECT TO CHANGE
AuthHandler | |
|
Instances
Generic (AuthHandler r usr) Source # | |
Defined in Servant.Server.Experimental.Auth type Rep (AuthHandler r usr) :: Type -> Type # from :: AuthHandler r usr -> Rep (AuthHandler r usr) x # to :: Rep (AuthHandler r usr) x -> AuthHandler r usr # | |
type Rep (AuthHandler r usr) Source # | |
Defined in Servant.Server.Experimental.Auth type Rep (AuthHandler r usr) = D1 ('MetaData "AuthHandler" "Servant.Server.Experimental.Auth" "servant-server-0.19.1-Ig6dUF3nKPa2S0O0ed0aaO" 'True) (C1 ('MetaCons "AuthHandler" 'PrefixI 'True) (S1 ('MetaSel ('Just "unAuthHandler") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (r -> Handler usr)))) |
mkAuthHandler :: (r -> Handler usr) -> AuthHandler r usr Source #
NOTE: THIS API IS EXPERIMENTAL AND SUBJECT TO CHANGE
Orphan instances
(HasServer api context, HasContextEntry context (AuthHandler Request (AuthServerData (AuthProtect tag)))) => HasServer (AuthProtect tag :> api :: Type) context Source # | Known orphan instance. |
type ServerT (AuthProtect tag :> api) m Source # route :: Proxy (AuthProtect tag :> api) -> Context context -> Delayed env (Server (AuthProtect tag :> api)) -> Router env Source # hoistServerWithContext :: Proxy (AuthProtect tag :> api) -> Proxy context -> (forall x. m x -> n x) -> ServerT (AuthProtect tag :> api) m -> ServerT (AuthProtect tag :> api) n Source # |