servant-auth-server-0.4.0.0: servant-server/servant-auth compatibility

Safe HaskellNone
LanguageHaskell2010

Servant.Auth.Server.Internal.ConfigTypes

Synopsis

Documentation

data IsMatch Source #

Constructors

Matches 
DoesNotMatch 

Instances

Eq IsMatch Source # 

Methods

(==) :: IsMatch -> IsMatch -> Bool #

(/=) :: IsMatch -> IsMatch -> Bool #

Ord IsMatch Source # 
Read IsMatch Source # 
Show IsMatch Source # 
Generic IsMatch Source # 

Associated Types

type Rep IsMatch :: * -> * #

Methods

from :: IsMatch -> Rep IsMatch x #

to :: Rep IsMatch x -> IsMatch #

type Rep IsMatch Source # 
type Rep IsMatch = D1 * (MetaData "IsMatch" "Servant.Auth.Server.Internal.ConfigTypes" "servant-auth-server-0.4.0.0-CNdGYAhDv8z2QY7Alu2vIl" False) ((:+:) * (C1 * (MetaCons "Matches" PrefixI False) (U1 *)) (C1 * (MetaCons "DoesNotMatch" PrefixI False) (U1 *)))

data IsPasswordCorrect Source #

Instances

Eq IsPasswordCorrect Source # 
Ord IsPasswordCorrect Source # 
Read IsPasswordCorrect Source # 
Show IsPasswordCorrect Source # 
Generic IsPasswordCorrect Source # 
type Rep IsPasswordCorrect Source # 
type Rep IsPasswordCorrect = D1 * (MetaData "IsPasswordCorrect" "Servant.Auth.Server.Internal.ConfigTypes" "servant-auth-server-0.4.0.0-CNdGYAhDv8z2QY7Alu2vIl" False) ((:+:) * (C1 * (MetaCons "PasswordCorrect" PrefixI False) (U1 *)) (C1 * (MetaCons "PasswordIncorrect" PrefixI False) (U1 *)))

data SameSite Source #

Instances

Eq SameSite Source # 
Ord SameSite Source # 
Read SameSite Source # 
Show SameSite Source # 
Generic SameSite Source # 

Associated Types

type Rep SameSite :: * -> * #

Methods

from :: SameSite -> Rep SameSite x #

to :: Rep SameSite x -> SameSite #

type Rep SameSite Source # 
type Rep SameSite = D1 * (MetaData "SameSite" "Servant.Auth.Server.Internal.ConfigTypes" "servant-auth-server-0.4.0.0-CNdGYAhDv8z2QY7Alu2vIl" False) ((:+:) * (C1 * (MetaCons "AnySite" PrefixI False) (U1 *)) ((:+:) * (C1 * (MetaCons "SameSiteStrict" PrefixI False) (U1 *)) (C1 * (MetaCons "SameSiteLax" PrefixI False) (U1 *))))

data JWTSettings Source #

JWTSettings are used to generate cookies, and to verify JWTs.

Constructors

JWTSettings 

Fields

Instances

Generic JWTSettings Source # 

Associated Types

type Rep JWTSettings :: * -> * #

type Rep JWTSettings Source # 
type Rep JWTSettings = D1 * (MetaData "JWTSettings" "Servant.Auth.Server.Internal.ConfigTypes" "servant-auth-server-0.4.0.0-CNdGYAhDv8z2QY7Alu2vIl" False) (C1 * (MetaCons "JWTSettings" PrefixI True) ((:*:) * ((:*:) * (S1 * (MetaSel (Just Symbol "signingKey") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * JWK)) (S1 * (MetaSel (Just Symbol "jwtAlg") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * (Maybe Alg)))) ((:*:) * (S1 * (MetaSel (Just Symbol "validationKeys") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * JWKSet)) (S1 * (MetaSel (Just Symbol "audienceMatches") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * (StringOrURI -> IsMatch))))))

defaultJWTSettings :: JWK -> JWTSettings Source #

A JWTSettings where the audience always matches.

data CookieSettings Source #

The policies to use when generating cookies.

If *both* cookieMaxAge and cookieExpires are Nothing, browsers will treat the cookie as a *session cookie*. These will be deleted when the browser is closed.

Note that having the setting Secure may cause testing failures if you are not testing over HTTPS.

Constructors

CookieSettings 

Fields

Instances

Eq CookieSettings Source # 
Show CookieSettings Source # 
Generic CookieSettings Source # 

Associated Types

type Rep CookieSettings :: * -> * #

Default CookieSettings Source # 

Methods

def :: CookieSettings #

type Rep CookieSettings Source # 

data XsrfCookieSettings Source #

The policies to use when generating and verifying XSRF cookies

Constructors

XsrfCookieSettings 

Fields

data IsSecure :: * #

Was this request made over an SSL connection?

Note that this value will not tell you if the client originally made this request over SSL, but rather whether the current connection is SSL. The distinction lies with reverse proxies. In many cases, the client will connect to a load balancer over SSL, but connect to the WAI handler without SSL. In such a case, the handlers would get NotSecure, but from a user perspective, there is a secure connection.

Constructors

Secure

the connection to the server is secure (HTTPS)

NotSecure

the connection to the server is not secure (HTTP)

Instances

Eq IsSecure 
Ord IsSecure 
Read IsSecure 
Show IsSecure 
Generic IsSecure 

Associated Types

type Rep IsSecure :: * -> * #

Methods

from :: IsSecure -> Rep IsSecure x #

to :: Rep IsSecure x -> IsSecure #

HasServer k1 api context => HasServer * ((:>) * k1 IsSecure api) context 

Associated Types

type ServerT ((* :> k1) IsSecure api) (context :: (* :> k1) IsSecure api) (m :: * -> *) :: * #

Methods

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

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

type Rep IsSecure 
type Rep IsSecure = D1 * (MetaData "IsSecure" "Servant.API.IsSecure" "servant-0.12.1-IQpBeDNqCOaI4mofnuNxjc" False) ((:+:) * (C1 * (MetaCons "Secure" PrefixI False) (U1 *)) (C1 * (MetaCons "NotSecure" PrefixI False) (U1 *)))
type ServerT * ((:>) * k1 IsSecure api) m 
type ServerT * ((:>) * k1 IsSecure api) m = IsSecure -> ServerT k1 api m