ory-hydra-client-1.10.1: Auto-generated ory-hydra API Client
Safe HaskellNone
LanguageHaskell2010

ORYHydra.Model

Description

 
Synopsis

Parameter newtypes

All

newtype All Source #

Constructors

All 

Fields

Instances

Instances details
Eq All Source # 
Instance details

Defined in ORYHydra.Model

Methods

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

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

Show All Source # 
Instance details

Defined in ORYHydra.Model

Methods

showsPrec :: Int -> All -> ShowS #

show :: All -> String #

showList :: [All] -> ShowS #

HasOptionalParam RevokeConsentSessions All Source #

Optional Param "all" - If set to `?all=true`, deletes all consent sessions by the Subject that have been granted.

Instance details

Defined in ORYHydra.API.Admin

Methods

applyOptionalParam :: ORYHydraRequest RevokeConsentSessions contentType res accept -> All -> ORYHydraRequest RevokeConsentSessions contentType res accept Source #

(-&-) :: ORYHydraRequest RevokeConsentSessions contentType res accept -> All -> ORYHydraRequest RevokeConsentSessions contentType res accept Source #

Client

newtype Client Source #

Constructors

Client 

Fields

Instances

Instances details
Eq Client Source # 
Instance details

Defined in ORYHydra.Model

Methods

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

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

Show Client Source # 
Instance details

Defined in ORYHydra.Model

HasOptionalParam RevokeConsentSessions Client Source #

Optional Param "client" - If set, deletes only those consent sessions by the Subject that have been granted to the specified OAuth 2.0 Client ID

Instance details

Defined in ORYHydra.API.Admin

Methods

applyOptionalParam :: ORYHydraRequest RevokeConsentSessions contentType res accept -> Client -> ORYHydraRequest RevokeConsentSessions contentType res accept Source #

(-&-) :: ORYHydraRequest RevokeConsentSessions contentType res accept -> Client -> ORYHydraRequest RevokeConsentSessions contentType res accept Source #

ClientId

newtype ClientId Source #

Constructors

ClientId 

Fields

Instances

Instances details
Eq ClientId Source # 
Instance details

Defined in ORYHydra.Model

Show ClientId Source # 
Instance details

Defined in ORYHydra.Model

HasOptionalParam Oauth2Token ClientId Source # 
Instance details

Defined in ORYHydra.API.Public

Methods

applyOptionalParam :: ORYHydraRequest Oauth2Token contentType res accept -> ClientId -> ORYHydraRequest Oauth2Token contentType res accept Source #

(-&-) :: ORYHydraRequest Oauth2Token contentType res accept -> ClientId -> ORYHydraRequest Oauth2Token contentType res accept Source #

Code

newtype Code Source #

Constructors

Code 

Fields

Instances

Instances details
Eq Code Source # 
Instance details

Defined in ORYHydra.Model

Methods

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

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

Show Code Source # 
Instance details

Defined in ORYHydra.Model

Methods

showsPrec :: Int -> Code -> ShowS #

show :: Code -> String #

showList :: [Code] -> ShowS #

HasOptionalParam Oauth2Token Code Source # 
Instance details

Defined in ORYHydra.API.Public

Methods

applyOptionalParam :: ORYHydraRequest Oauth2Token contentType res accept -> Code -> ORYHydraRequest Oauth2Token contentType res accept Source #

(-&-) :: ORYHydraRequest Oauth2Token contentType res accept -> Code -> ORYHydraRequest Oauth2Token contentType res accept Source #

ConsentChallenge

GrantType

newtype GrantType Source #

Constructors

GrantType 

Fields

Instances

Instances details
Eq GrantType Source # 
Instance details

Defined in ORYHydra.Model

Show GrantType Source # 
Instance details

Defined in ORYHydra.Model

Id

newtype Id Source #

Constructors

Id 

Fields

Instances

Instances details
Eq Id Source # 
Instance details

Defined in ORYHydra.Model

Methods

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

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

Show Id Source # 
Instance details

Defined in ORYHydra.Model

Methods

showsPrec :: Int -> Id -> ShowS #

show :: Id -> String #

showList :: [Id] -> ShowS #

Kid

newtype Kid Source #

Constructors

Kid 

Fields

Instances

Instances details
Eq Kid Source # 
Instance details

Defined in ORYHydra.Model

Methods

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

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

Show Kid Source # 
Instance details

Defined in ORYHydra.Model

Methods

showsPrec :: Int -> Kid -> ShowS #

show :: Kid -> String #

showList :: [Kid] -> ShowS #

Limit

newtype Limit Source #

Constructors

Limit 

Fields

Instances

Instances details
Eq Limit Source # 
Instance details

Defined in ORYHydra.Model

Methods

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

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

Show Limit Source # 
Instance details

Defined in ORYHydra.Model

Methods

showsPrec :: Int -> Limit -> ShowS #

show :: Limit -> String #

showList :: [Limit] -> ShowS #

HasOptionalParam ListOAuth2Clients Limit Source #

Optional Param "limit" - The maximum amount of policies returned, upper bound is 500 policies

Instance details

Defined in ORYHydra.API.Admin

Methods

applyOptionalParam :: ORYHydraRequest ListOAuth2Clients contentType res accept -> Limit -> ORYHydraRequest ListOAuth2Clients contentType res accept Source #

(-&-) :: ORYHydraRequest ListOAuth2Clients contentType res accept -> Limit -> ORYHydraRequest ListOAuth2Clients contentType res accept Source #

LoginChallenge

newtype LoginChallenge Source #

Constructors

LoginChallenge 

Instances

Instances details
Eq LoginChallenge Source # 
Instance details

Defined in ORYHydra.Model

Show LoginChallenge Source # 
Instance details

Defined in ORYHydra.Model

LogoutChallenge

newtype LogoutChallenge Source #

Constructors

LogoutChallenge 

Instances

Instances details
Eq LogoutChallenge Source # 
Instance details

Defined in ORYHydra.Model

Show LogoutChallenge Source # 
Instance details

Defined in ORYHydra.Model

Offset

newtype Offset Source #

Constructors

Offset 

Fields

Instances

Instances details
Eq Offset Source # 
Instance details

Defined in ORYHydra.Model

Methods

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

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

Show Offset Source # 
Instance details

Defined in ORYHydra.Model

HasOptionalParam ListOAuth2Clients Offset Source #

Optional Param "offset" - The offset from where to start looking.

Instance details

Defined in ORYHydra.API.Admin

Methods

applyOptionalParam :: ORYHydraRequest ListOAuth2Clients contentType res accept -> Offset -> ORYHydraRequest ListOAuth2Clients contentType res accept Source #

(-&-) :: ORYHydraRequest ListOAuth2Clients contentType res accept -> Offset -> ORYHydraRequest ListOAuth2Clients contentType res accept Source #

RedirectUri

newtype RedirectUri Source #

Constructors

RedirectUri 

Fields

Instances

Instances details
Eq RedirectUri Source # 
Instance details

Defined in ORYHydra.Model

Show RedirectUri Source # 
Instance details

Defined in ORYHydra.Model

HasOptionalParam Oauth2Token RedirectUri Source # 
Instance details

Defined in ORYHydra.API.Public

Methods

applyOptionalParam :: ORYHydraRequest Oauth2Token contentType res accept -> RedirectUri -> ORYHydraRequest Oauth2Token contentType res accept Source #

(-&-) :: ORYHydraRequest Oauth2Token contentType res accept -> RedirectUri -> ORYHydraRequest Oauth2Token contentType res accept Source #

RefreshToken

newtype RefreshToken Source #

Constructors

RefreshToken 

Fields

Instances

Instances details
Eq RefreshToken Source # 
Instance details

Defined in ORYHydra.Model

Show RefreshToken Source # 
Instance details

Defined in ORYHydra.Model

HasOptionalParam Oauth2Token RefreshToken Source # 
Instance details

Defined in ORYHydra.API.Public

Methods

applyOptionalParam :: ORYHydraRequest Oauth2Token contentType res accept -> RefreshToken -> ORYHydraRequest Oauth2Token contentType res accept Source #

(-&-) :: ORYHydraRequest Oauth2Token contentType res accept -> RefreshToken -> ORYHydraRequest Oauth2Token contentType res accept Source #

Scope

newtype Scope Source #

Constructors

Scope 

Fields

Instances

Instances details
Eq Scope Source # 
Instance details

Defined in ORYHydra.Model

Methods

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

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

Show Scope Source # 
Instance details

Defined in ORYHydra.Model

Methods

showsPrec :: Int -> Scope -> ShowS #

show :: Scope -> String #

showList :: [Scope] -> ShowS #

HasOptionalParam IntrospectOAuth2Token Scope Source #

Optional Param "scope" - An optional, space separated list of required scopes. If the access token was not granted one of the scopes, the result of active will be false.

Instance details

Defined in ORYHydra.API.Admin

Methods

applyOptionalParam :: ORYHydraRequest IntrospectOAuth2Token contentType res accept -> Scope -> ORYHydraRequest IntrospectOAuth2Token contentType res accept Source #

(-&-) :: ORYHydraRequest IntrospectOAuth2Token contentType res accept -> Scope -> ORYHydraRequest IntrospectOAuth2Token contentType res accept Source #

Set

newtype Set Source #

Constructors

Set 

Fields

Instances

Instances details
Eq Set Source # 
Instance details

Defined in ORYHydra.Model

Methods

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

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

Show Set Source # 
Instance details

Defined in ORYHydra.Model

Methods

showsPrec :: Int -> Set -> ShowS #

show :: Set -> String #

showList :: [Set] -> ShowS #

Subject

newtype Subject Source #

Constructors

Subject 

Fields

Instances

Instances details
Eq Subject Source # 
Instance details

Defined in ORYHydra.Model

Methods

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

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

Show Subject Source # 
Instance details

Defined in ORYHydra.Model

Token

newtype Token Source #

Constructors

Token 

Fields

Instances

Instances details
Eq Token Source # 
Instance details

Defined in ORYHydra.Model

Methods

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

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

Show Token Source # 
Instance details

Defined in ORYHydra.Model

Methods

showsPrec :: Int -> Token -> ShowS #

show :: Token -> String #

showList :: [Token] -> ShowS #

Models

AcceptConsentRequest

data AcceptConsentRequest Source #

AcceptConsentRequest The request payload used to accept a consent request.

Constructors

AcceptConsentRequest 

Fields

mkAcceptConsentRequest :: AcceptConsentRequest Source #

Construct a value of type AcceptConsentRequest (by applying it's required fields, if any)

AcceptLoginRequest

data AcceptLoginRequest Source #

AcceptLoginRequest HandledLoginRequest is the request payload used to accept a login request.

Constructors

AcceptLoginRequest 

Fields

  • acceptLoginRequestAcr :: Maybe Text

    "acr" - ACR sets the Authentication AuthorizationContext Class Reference value for this authentication session. You can use it to express that, for example, a user authenticated using two factor authentication.

  • acceptLoginRequestContext :: Maybe Value

    "context"

  • acceptLoginRequestForceSubjectIdentifier :: Maybe Text

    "force_subject_identifier" - ForceSubjectIdentifier forces the "pairwise" user ID of the end-user that authenticated. The "pairwise" user ID refers to the (Pairwise Identifier Algorithm)[http:/openid.netspecsopenid-connect-core-1_0.html#PairwiseAlg] of the OpenID Connect specification. It allows you to set an obfuscated subject ("user") identifier that is unique to the client. Please note that this changes the user ID on endpoint userinfo and sub claim of the ID Token. It does not change the sub claim in the OAuth 2.0 Introspection. Per default, ORY Hydra handles this value with its own algorithm. In case you want to set this yourself you can use this field. Please note that setting this field has no effect if `pairwise` is not configured in ORY Hydra or the OAuth 2.0 Client does not expect a pairwise identifier (set via `subject_type` key in the client's configuration). Please also be aware that ORY Hydra is unable to properly compute this value during authentication. This implies that you have to compute this value on every authentication process (probably depending on the client ID or some other unique value). If you fail to compute the proper value, then authentication processes which have id_token_hint set might fail.

  • acceptLoginRequestRemember :: Maybe Bool

    "remember" - Remember, if set to true, tells ORY Hydra to remember this user by telling the user agent (browser) to store a cookie with authentication data. If the same user performs another OAuth 2.0 Authorization Request, he/she will not be asked to log in again.

  • acceptLoginRequestRememberFor :: Maybe Integer

    "remember_for" - RememberFor sets how long the authentication should be remembered for in seconds. If set to `0`, the authorization will be remembered for the duration of the browser session (using a session cookie).

  • acceptLoginRequestSubject :: Text

    Required "subject" - Subject is the user ID of the end-user that authenticated.

mkAcceptLoginRequest Source #

Arguments

:: Text

acceptLoginRequestSubject: Subject is the user ID of the end-user that authenticated.

-> AcceptLoginRequest 

Construct a value of type AcceptLoginRequest (by applying it's required fields, if any)

CompletedRequest

data CompletedRequest Source #

CompletedRequest The response payload sent when accepting or rejecting a login or consent request.

Constructors

CompletedRequest 

Fields

  • completedRequestRedirectTo :: Text

    Required "redirect_to" - RedirectURL is the URL which you should redirect the user to once the authentication process is completed.

mkCompletedRequest Source #

Arguments

:: Text

completedRequestRedirectTo: RedirectURL is the URL which you should redirect the user to once the authentication process is completed.

-> CompletedRequest 

Construct a value of type CompletedRequest (by applying it's required fields, if any)

ConsentRequest

data ConsentRequest Source #

ConsentRequest Contains information on an ongoing consent request.

Constructors

ConsentRequest 

Fields

  • consentRequestAcr :: Maybe Text

    "acr" - ACR represents the Authentication AuthorizationContext Class Reference value for this authentication session. You can use it to express that, for example, a user authenticated using two factor authentication.

  • consentRequestChallenge :: Text

    Required "challenge" - ID is the identifier ("authorization challenge") of the consent authorization request. It is used to identify the session.

  • consentRequestClient :: Maybe OAuth2Client

    "client"

  • consentRequestContext :: Maybe Value

    "context"

  • consentRequestLoginChallenge :: Maybe Text

    "login_challenge" - LoginChallenge is the login challenge this consent challenge belongs to. It can be used to associate a login and consent request in the login & consent app.

  • consentRequestLoginSessionId :: Maybe Text

    "login_session_id" - LoginSessionID is the login session ID. If the user-agent reuses a login session (via cookie remember flag) this ID will remain the same. If the user-agent did not have an existing authentication session (e.g. remember is false) this will be a new random value. This value is used as the "sid" parameter in the ID Token and in OIDC Front-Back- channel logout. It's value can generally be used to associate consecutive login requests by a certain user.

  • consentRequestOidcContext :: Maybe OpenIDConnectContext

    "oidc_context"

  • consentRequestRequestUrl :: Maybe Text

    "request_url" - RequestURL is the original OAuth 2.0 Authorization URL requested by the OAuth 2.0 client. It is the URL which initiates the OAuth 2.0 Authorization Code or OAuth 2.0 Implicit flow. This URL is typically not needed, but might come in handy if you want to deal with additional request parameters.

  • consentRequestRequestedAccessTokenAudience :: Maybe [Text]

    "requested_access_token_audience"

  • consentRequestRequestedScope :: Maybe [Text]

    "requested_scope"

  • consentRequestSkip :: Maybe Bool

    "skip" - Skip, if true, implies that the client has requested the same scopes from the same user previously. If true, you must not ask the user to grant the requested scopes. You must however either allow or deny the consent request using the usual API call.

  • consentRequestSubject :: Maybe Text

    "subject" - Subject is the user ID of the end-user that authenticated. Now, that end user needs to grant or deny the scope requested by the OAuth 2.0 client.

Instances

Instances details
Eq ConsentRequest Source # 
Instance details

Defined in ORYHydra.Model

Show ConsentRequest Source # 
Instance details

Defined in ORYHydra.Model

ToJSON ConsentRequest Source #

ToJSON ConsentRequest

Instance details

Defined in ORYHydra.Model

FromJSON ConsentRequest Source #

FromJSON ConsentRequest

Instance details

Defined in ORYHydra.Model

mkConsentRequest Source #

Arguments

:: Text

consentRequestChallenge: ID is the identifier ("authorization challenge") of the consent authorization request. It is used to identify the session.

-> ConsentRequest 

Construct a value of type ConsentRequest (by applying it's required fields, if any)

ConsentRequestSession

data ConsentRequestSession Source #

ConsentRequestSession Used to pass session data to a consent request.

Constructors

ConsentRequestSession 

Fields

  • consentRequestSessionAccessToken :: Maybe Value

    "access_token" - AccessToken sets session data for the access and refresh token, as well as any future tokens issued by the refresh grant. Keep in mind that this data will be available to anyone performing OAuth 2.0 Challenge Introspection. If only your services can perform OAuth 2.0 Challenge Introspection, this is usually fine. But if third parties can access that endpoint as well, sensitive data from the session might be exposed to them. Use with care!

  • consentRequestSessionIdToken :: Maybe Value

    "id_token" - IDToken sets session data for the OpenID Connect ID token. Keep in mind that the session'id payloads are readable by anyone that has access to the ID Challenge. Use with care!

mkConsentRequestSession :: ConsentRequestSession Source #

Construct a value of type ConsentRequestSession (by applying it's required fields, if any)

ContainerWaitOKBodyError

mkContainerWaitOKBodyError :: ContainerWaitOKBodyError Source #

Construct a value of type ContainerWaitOKBodyError (by applying it's required fields, if any)

FlushInactiveOAuth2TokensRequest

data FlushInactiveOAuth2TokensRequest Source #

FlushInactiveOAuth2TokensRequest

Constructors

FlushInactiveOAuth2TokensRequest 

Fields

Instances

Instances details
Eq FlushInactiveOAuth2TokensRequest Source # 
Instance details

Defined in ORYHydra.Model

Show FlushInactiveOAuth2TokensRequest Source # 
Instance details

Defined in ORYHydra.Model

ToJSON FlushInactiveOAuth2TokensRequest Source #

ToJSON FlushInactiveOAuth2TokensRequest

Instance details

Defined in ORYHydra.Model

FromJSON FlushInactiveOAuth2TokensRequest Source #

FromJSON FlushInactiveOAuth2TokensRequest

Instance details

Defined in ORYHydra.Model

HasBodyParam FlushInactiveOAuth2Tokens FlushInactiveOAuth2TokensRequest Source # 
Instance details

Defined in ORYHydra.API.Admin

mkFlushInactiveOAuth2TokensRequest :: FlushInactiveOAuth2TokensRequest Source #

Construct a value of type FlushInactiveOAuth2TokensRequest (by applying it's required fields, if any)

GenericError

data GenericError Source #

GenericError Error response

Error responses are sent when an error (e.g. unauthorized, bad request, ...) occurred.

Constructors

GenericError 

Fields

Instances

Instances details
Eq GenericError Source # 
Instance details

Defined in ORYHydra.Model

Show GenericError Source # 
Instance details

Defined in ORYHydra.Model

ToJSON GenericError Source #

ToJSON GenericError

Instance details

Defined in ORYHydra.Model

FromJSON GenericError Source #

FromJSON GenericError

Instance details

Defined in ORYHydra.Model

mkGenericError Source #

Arguments

:: Text

genericErrorError: Name is the error name.

-> GenericError 

Construct a value of type GenericError (by applying it's required fields, if any)

HealthNotReadyStatus

data HealthNotReadyStatus Source #

HealthNotReadyStatus

Constructors

HealthNotReadyStatus 

Fields

mkHealthNotReadyStatus :: HealthNotReadyStatus Source #

Construct a value of type HealthNotReadyStatus (by applying it's required fields, if any)

HealthStatus

data HealthStatus Source #

HealthStatus

Constructors

HealthStatus 

Fields

Instances

Instances details
Eq HealthStatus Source # 
Instance details

Defined in ORYHydra.Model

Show HealthStatus Source # 
Instance details

Defined in ORYHydra.Model

ToJSON HealthStatus Source #

ToJSON HealthStatus

Instance details

Defined in ORYHydra.Model

FromJSON HealthStatus Source #

FromJSON HealthStatus

Instance details

Defined in ORYHydra.Model

mkHealthStatus :: HealthStatus Source #

Construct a value of type HealthStatus (by applying it's required fields, if any)

JSONWebKey

data JSONWebKey Source #

JSONWebKey It is important that this model object is named JSONWebKey for "swagger generate spec" to generate only on definition of a JSONWebKey.

Constructors

JSONWebKey 

Fields

  • jSONWebKeyAlg :: Text

    Required "alg" - The "alg" (algorithm) parameter identifies the algorithm intended for use with the key. The values used should either be registered in the IANA "JSON Web Signature and Encryption Algorithms" registry established by [JWA] or be a value that contains a Collision- Resistant Name.

  • jSONWebKeyCrv :: Maybe Text

    "crv"

  • jSONWebKeyD :: Maybe Text

    "d"

  • jSONWebKeyDp :: Maybe Text

    "dp"

  • jSONWebKeyDq :: Maybe Text

    "dq"

  • jSONWebKeyE :: Maybe Text

    "e"

  • jSONWebKeyK :: Maybe Text

    "k"

  • jSONWebKeyKid :: Text

    Required "kid" - The "kid" (key ID) parameter is used to match a specific key. This is used, for instance, to choose among a set of keys within a JWK Set during key rollover. The structure of the "kid" value is unspecified. When "kid" values are used within a JWK Set, different keys within the JWK Set SHOULD use distinct "kid" values. (One example in which different keys might use the same "kid" value is if they have different "kty" (key type) values but are considered to be equivalent alternatives by the application using them.) The "kid" value is a case-sensitive string.

  • jSONWebKeyKty :: Text

    Required "kty" - The "kty" (key type) parameter identifies the cryptographic algorithm family used with the key, such as "RSA" or "EC". "kty" values should either be registered in the IANA "JSON Web Key Types" registry established by [JWA] or be a value that contains a Collision- Resistant Name. The "kty" value is a case-sensitive string.

  • jSONWebKeyN :: Maybe Text

    "n"

  • jSONWebKeyP :: Maybe Text

    "p"

  • jSONWebKeyQ :: Maybe Text

    "q"

  • jSONWebKeyQi :: Maybe Text

    "qi"

  • jSONWebKeyUse :: Text

    Required "use" - Use ("public key use") identifies the intended use of the public key. The "use" parameter is employed to indicate whether a public key is used for encrypting data or verifying the signature on data. Values are commonly "sig" (signature) or "enc" (encryption).

  • jSONWebKeyX :: Maybe Text

    "x"

  • jSONWebKeyX5c :: Maybe [Text]

    "x5c" - The "x5c" (X.509 certificate chain) parameter contains a chain of one or more PKIX certificates [RFC5280]. The certificate chain is represented as a JSON array of certificate value strings. Each string in the array is a base64-encoded (Section 4 of [RFC4648] -- not base64url-encoded) DER [ITU.X690.1994] PKIX certificate value. The PKIX certificate containing the key value MUST be the first certificate.

  • jSONWebKeyY :: Maybe Text

    "y"

Instances

Instances details
Eq JSONWebKey Source # 
Instance details

Defined in ORYHydra.Model

Show JSONWebKey Source # 
Instance details

Defined in ORYHydra.Model

ToJSON JSONWebKey Source #

ToJSON JSONWebKey

Instance details

Defined in ORYHydra.Model

FromJSON JSONWebKey Source #

FromJSON JSONWebKey

Instance details

Defined in ORYHydra.Model

HasBodyParam UpdateJsonWebKey JSONWebKey Source # 
Instance details

Defined in ORYHydra.API.Admin

Methods

setBodyParam :: (Consumes UpdateJsonWebKey contentType, MimeRender contentType JSONWebKey) => ORYHydraRequest UpdateJsonWebKey contentType res accept -> JSONWebKey -> ORYHydraRequest UpdateJsonWebKey contentType res accept Source #

mkJSONWebKey Source #

Arguments

:: Text

jSONWebKeyAlg: The "alg" (algorithm) parameter identifies the algorithm intended for use with the key. The values used should either be registered in the IANA "JSON Web Signature and Encryption Algorithms" registry established by [JWA] or be a value that contains a Collision- Resistant Name.

-> Text

jSONWebKeyKid: The "kid" (key ID) parameter is used to match a specific key. This is used, for instance, to choose among a set of keys within a JWK Set during key rollover. The structure of the "kid" value is unspecified. When "kid" values are used within a JWK Set, different keys within the JWK Set SHOULD use distinct "kid" values. (One example in which different keys might use the same "kid" value is if they have different "kty" (key type) values but are considered to be equivalent alternatives by the application using them.) The "kid" value is a case-sensitive string.

-> Text

jSONWebKeyKty: The "kty" (key type) parameter identifies the cryptographic algorithm family used with the key, such as "RSA" or "EC". "kty" values should either be registered in the IANA "JSON Web Key Types" registry established by [JWA] or be a value that contains a Collision- Resistant Name. The "kty" value is a case-sensitive string.

-> Text

jSONWebKeyUse: Use ("public key use") identifies the intended use of the public key. The "use" parameter is employed to indicate whether a public key is used for encrypting data or verifying the signature on data. Values are commonly "sig" (signature) or "enc" (encryption).

-> JSONWebKey 

Construct a value of type JSONWebKey (by applying it's required fields, if any)

JSONWebKeySet

data JSONWebKeySet Source #

JSONWebKeySet It is important that this model object is named JSONWebKeySet for "swagger generate spec" to generate only on definition of a JSONWebKeySet. Since one with the same name is previously defined as client.Client.JSONWebKeys and this one is last, this one will be effectively written in the swagger spec.

Constructors

JSONWebKeySet 

Fields

  • jSONWebKeySetKeys :: Maybe [JSONWebKey]

    "keys" - The value of the "keys" parameter is an array of JWK values. By default, the order of the JWK values within the array does not imply an order of preference among them, although applications of JWK Sets can choose to assign a meaning to the order for their purposes, if desired.

Instances

Instances details
Eq JSONWebKeySet Source # 
Instance details

Defined in ORYHydra.Model

Show JSONWebKeySet Source # 
Instance details

Defined in ORYHydra.Model

ToJSON JSONWebKeySet Source #

ToJSON JSONWebKeySet

Instance details

Defined in ORYHydra.Model

FromJSON JSONWebKeySet Source #

FromJSON JSONWebKeySet

Instance details

Defined in ORYHydra.Model

HasBodyParam UpdateJsonWebKeySet JSONWebKeySet Source # 
Instance details

Defined in ORYHydra.API.Admin

Methods

setBodyParam :: (Consumes UpdateJsonWebKeySet contentType, MimeRender contentType JSONWebKeySet) => ORYHydraRequest UpdateJsonWebKeySet contentType res accept -> JSONWebKeySet -> ORYHydraRequest UpdateJsonWebKeySet contentType res accept Source #

mkJSONWebKeySet :: JSONWebKeySet Source #

Construct a value of type JSONWebKeySet (by applying it's required fields, if any)

JsonWebKeySetGeneratorRequest

data JsonWebKeySetGeneratorRequest Source #

JsonWebKeySetGeneratorRequest

Constructors

JsonWebKeySetGeneratorRequest 

Fields

  • jsonWebKeySetGeneratorRequestAlg :: Text

    Required "alg" - The algorithm to be used for creating the key. Supports "RS256", "ES512", "HS512", and "HS256"

  • jsonWebKeySetGeneratorRequestKid :: Text

    Required "kid" - The kid of the key to be created

  • jsonWebKeySetGeneratorRequestUse :: Text

    Required "use" - The "use" (public key use) parameter identifies the intended use of the public key. The "use" parameter is employed to indicate whether a public key is used for encrypting data or verifying the signature on data. Valid values are "enc" and "sig".

Instances

Instances details
Eq JsonWebKeySetGeneratorRequest Source # 
Instance details

Defined in ORYHydra.Model

Show JsonWebKeySetGeneratorRequest Source # 
Instance details

Defined in ORYHydra.Model

ToJSON JsonWebKeySetGeneratorRequest Source #

ToJSON JsonWebKeySetGeneratorRequest

Instance details

Defined in ORYHydra.Model

FromJSON JsonWebKeySetGeneratorRequest Source #

FromJSON JsonWebKeySetGeneratorRequest

Instance details

Defined in ORYHydra.Model

HasBodyParam CreateJsonWebKeySet JsonWebKeySetGeneratorRequest Source # 
Instance details

Defined in ORYHydra.API.Admin

mkJsonWebKeySetGeneratorRequest Source #

Arguments

:: Text

jsonWebKeySetGeneratorRequestAlg: The algorithm to be used for creating the key. Supports "RS256", "ES512", "HS512", and "HS256"

-> Text

jsonWebKeySetGeneratorRequestKid: The kid of the key to be created

-> Text

jsonWebKeySetGeneratorRequestUse: The "use" (public key use) parameter identifies the intended use of the public key. The "use" parameter is employed to indicate whether a public key is used for encrypting data or verifying the signature on data. Valid values are "enc" and "sig".

-> JsonWebKeySetGeneratorRequest 

Construct a value of type JsonWebKeySetGeneratorRequest (by applying it's required fields, if any)

LoginRequest

data LoginRequest Source #

LoginRequest Contains information on an ongoing login request.

Constructors

LoginRequest 

Fields

  • loginRequestChallenge :: Text

    Required "challenge" - ID is the identifier ("login challenge") of the login request. It is used to identify the session.

  • loginRequestClient :: OAuth2Client

    Required "client"

  • loginRequestOidcContext :: Maybe OpenIDConnectContext

    "oidc_context"

  • loginRequestRequestUrl :: Text

    Required "request_url" - RequestURL is the original OAuth 2.0 Authorization URL requested by the OAuth 2.0 client. It is the URL which initiates the OAuth 2.0 Authorization Code or OAuth 2.0 Implicit flow. This URL is typically not needed, but might come in handy if you want to deal with additional request parameters.

  • loginRequestRequestedAccessTokenAudience :: [Text]

    Required "requested_access_token_audience"

  • loginRequestRequestedScope :: [Text]

    Required "requested_scope"

  • loginRequestSessionId :: Maybe Text

    "session_id" - SessionID is the login session ID. If the user-agent reuses a login session (via cookie remember flag) this ID will remain the same. If the user-agent did not have an existing authentication session (e.g. remember is false) this will be a new random value. This value is used as the "sid" parameter in the ID Token and in OIDC Front-Back- channel logout. It's value can generally be used to associate consecutive login requests by a certain user.

  • loginRequestSkip :: Bool

    Required "skip" - Skip, if true, implies that the client has requested the same scopes from the same user previously. If true, you can skip asking the user to grant the requested scopes, and simply forward the user to the redirect URL. This feature allows you to update / set session information.

  • loginRequestSubject :: Text

    Required "subject" - Subject is the user ID of the end-user that authenticated. Now, that end user needs to grant or deny the scope requested by the OAuth 2.0 client. If this value is set and `skip` is true, you MUST include this subject type when accepting the login request, or the request will fail.

Instances

Instances details
Eq LoginRequest Source # 
Instance details

Defined in ORYHydra.Model

Show LoginRequest Source # 
Instance details

Defined in ORYHydra.Model

ToJSON LoginRequest Source #

ToJSON LoginRequest

Instance details

Defined in ORYHydra.Model

FromJSON LoginRequest Source #

FromJSON LoginRequest

Instance details

Defined in ORYHydra.Model

mkLoginRequest Source #

Arguments

:: Text

loginRequestChallenge: ID is the identifier ("login challenge") of the login request. It is used to identify the session.

-> OAuth2Client

loginRequestClient

-> Text

loginRequestRequestUrl: RequestURL is the original OAuth 2.0 Authorization URL requested by the OAuth 2.0 client. It is the URL which initiates the OAuth 2.0 Authorization Code or OAuth 2.0 Implicit flow. This URL is typically not needed, but might come in handy if you want to deal with additional request parameters.

-> [Text]

loginRequestRequestedAccessTokenAudience

-> [Text]

loginRequestRequestedScope

-> Bool

loginRequestSkip: Skip, if true, implies that the client has requested the same scopes from the same user previously. If true, you can skip asking the user to grant the requested scopes, and simply forward the user to the redirect URL. This feature allows you to update / set session information.

-> Text

loginRequestSubject: Subject is the user ID of the end-user that authenticated. Now, that end user needs to grant or deny the scope requested by the OAuth 2.0 client. If this value is set and skip is true, you MUST include this subject type when accepting the login request, or the request will fail.

-> LoginRequest 

Construct a value of type LoginRequest (by applying it's required fields, if any)

LogoutRequest

data LogoutRequest Source #

LogoutRequest Contains information about an ongoing logout request.

Constructors

LogoutRequest 

Fields

Instances

Instances details
Eq LogoutRequest Source # 
Instance details

Defined in ORYHydra.Model

Show LogoutRequest Source # 
Instance details

Defined in ORYHydra.Model

ToJSON LogoutRequest Source #

ToJSON LogoutRequest

Instance details

Defined in ORYHydra.Model

FromJSON LogoutRequest Source #

FromJSON LogoutRequest

Instance details

Defined in ORYHydra.Model

mkLogoutRequest :: LogoutRequest Source #

Construct a value of type LogoutRequest (by applying it's required fields, if any)

OAuth2Client

data OAuth2Client Source #

OAuth2Client Client represents an OAuth 2.0 Client.

Constructors

OAuth2Client 

Fields

  • oAuth2ClientAllowedCorsOrigins :: Maybe [Text]

    "allowed_cors_origins"

  • oAuth2ClientAudience :: Maybe [Text]

    "audience"

  • oAuth2ClientBackchannelLogoutSessionRequired :: Maybe Bool

    "backchannel_logout_session_required" - Boolean value specifying whether the RP requires that a sid (session ID) Claim be included in the Logout Token to identify the RP session with the OP when the backchannel_logout_uri is used. If omitted, the default value is false.

  • oAuth2ClientBackchannelLogoutUri :: Maybe Text

    "backchannel_logout_uri" - RP URL that will cause the RP to log itself out when sent a Logout Token by the OP.

  • oAuth2ClientClientId :: Maybe Text

    "client_id" - ID is the id for this client.

  • oAuth2ClientClientName :: Maybe Text

    "client_name" - Name is the human-readable string name of the client to be presented to the end-user during authorization.

  • oAuth2ClientClientSecret :: Maybe Text

    "client_secret" - Secret is the client's secret. The secret will be included in the create request as cleartext, and then never again. The secret is stored using BCrypt so it is impossible to recover it. Tell your users that they need to write the secret down as it will not be made available again.

  • oAuth2ClientClientSecretExpiresAt :: Maybe Integer

    "client_secret_expires_at" - SecretExpiresAt is an integer holding the time at which the client secret will expire or 0 if it will not expire. The time is represented as the number of seconds from 1970-01-01T00:00:00Z as measured in UTC until the date/time of expiration. This feature is currently not supported and it's value will always be set to 0.

  • oAuth2ClientClientUri :: Maybe Text

    "client_uri" - ClientURI is an URL string of a web page providing information about the client. If present, the server SHOULD display this URL to the end-user in a clickable fashion.

  • oAuth2ClientContacts :: Maybe [Text]

    "contacts"

  • oAuth2ClientCreatedAt :: Maybe DateTime

    "created_at" - CreatedAt returns the timestamp of the client's creation.

  • oAuth2ClientFrontchannelLogoutSessionRequired :: Maybe Bool

    "frontchannel_logout_session_required" - Boolean value specifying whether the RP requires that iss (issuer) and sid (session ID) query parameters be included to identify the RP session with the OP when the frontchannel_logout_uri is used. If omitted, the default value is false.

  • oAuth2ClientFrontchannelLogoutUri :: Maybe Text

    "frontchannel_logout_uri" - RP URL that will cause the RP to log itself out when rendered in an iframe by the OP. An iss (issuer) query parameter and a sid (session ID) query parameter MAY be included by the OP to enable the RP to validate the request and to determine which of the potentially multiple sessions is to be logged out; if either is included, both MUST be.

  • oAuth2ClientGrantTypes :: Maybe [Text]

    "grant_types"

  • oAuth2ClientJwks :: Maybe Value

    "jwks"

  • oAuth2ClientJwksUri :: Maybe Text

    "jwks_uri" - URL for the Client's JSON Web Key Set [JWK] document. If the Client signs requests to the Server, it contains the signing key(s) the Server uses to validate signatures from the Client. The JWK Set MAY also contain the Client's encryption keys(s), which are used by the Server to encrypt responses to the Client. When both signing and encryption keys are made available, a use (Key Use) parameter value is REQUIRED for all keys in the referenced JWK Set to indicate each key's intended usage. Although some algorithms allow the same key to be used for both signatures and encryption, doing so is NOT RECOMMENDED, as it is less secure. The JWK x5c parameter MAY be used to provide X.509 representations of keys provided. When used, the bare key values MUST still be present and MUST match those in the certificate.

  • oAuth2ClientLogoUri :: Maybe Text

    "logo_uri" - LogoURI is an URL string that references a logo for the client.

  • oAuth2ClientMetadata :: Maybe Value

    "metadata"

  • oAuth2ClientOwner :: Maybe Text

    "owner" - Owner is a string identifying the owner of the OAuth 2.0 Client.

  • oAuth2ClientPolicyUri :: Maybe Text

    "policy_uri" - PolicyURI is a URL string that points to a human-readable privacy policy document that describes how the deployment organization collects, uses, retains, and discloses personal data.

  • oAuth2ClientPostLogoutRedirectUris :: Maybe [Text]

    "post_logout_redirect_uris"

  • oAuth2ClientRedirectUris :: Maybe [Text]

    "redirect_uris"

  • oAuth2ClientRequestObjectSigningAlg :: Maybe Text

    "request_object_signing_alg" - JWS [JWS] alg algorithm [JWA] that MUST be used for signing Request Objects sent to the OP. All Request Objects from this Client MUST be rejected, if not signed with this algorithm.

  • oAuth2ClientRequestUris :: Maybe [Text]

    "request_uris"

  • oAuth2ClientResponseTypes :: Maybe [Text]

    "response_types"

  • oAuth2ClientScope :: Maybe Text

    "scope" - Scope is a string containing a space-separated list of scope values (as described in Section 3.3 of OAuth 2.0 [RFC6749]) that the client can use when requesting access tokens.

  • oAuth2ClientSectorIdentifierUri :: Maybe Text

    "sector_identifier_uri" - URL using the https scheme to be used in calculating Pseudonymous Identifiers by the OP. The URL references a file with a single JSON array of redirect_uri values.

  • oAuth2ClientSubjectType :: Maybe Text

    "subject_type" - SubjectType requested for responses to this Client. The subject_types_supported Discovery parameter contains a list of the supported subject_type values for this server. Valid types include `pairwise` and `public`.

  • oAuth2ClientTokenEndpointAuthMethod :: Maybe Text

    "token_endpoint_auth_method" - Requested Client Authentication method for the Token Endpoint. The options are client_secret_post, client_secret_basic, private_key_jwt, and none.

  • oAuth2ClientTokenEndpointAuthSigningAlg :: Maybe Text

    "token_endpoint_auth_signing_alg" - Requested Client Authentication signing algorithm for the Token Endpoint.

  • oAuth2ClientTosUri :: Maybe Text

    "tos_uri" - TermsOfServiceURI is a URL string that points to a human-readable terms of service document for the client that describes a contractual relationship between the end-user and the client that the end-user accepts when authorizing the client.

  • oAuth2ClientUpdatedAt :: Maybe DateTime

    "updated_at" - UpdatedAt returns the timestamp of the last update.

  • oAuth2ClientUserinfoSignedResponseAlg :: Maybe Text

    "userinfo_signed_response_alg" - JWS alg algorithm [JWA] REQUIRED for signing UserInfo Responses. If this is specified, the response will be JWT [JWT] serialized, and signed using JWS. The default, if omitted, is for the UserInfo Response to return the Claims as a UTF-8 encoded JSON object using the application/json content-type.

Instances

Instances details
Eq OAuth2Client Source # 
Instance details

Defined in ORYHydra.Model

Show OAuth2Client Source # 
Instance details

Defined in ORYHydra.Model

ToJSON OAuth2Client Source #

ToJSON OAuth2Client

Instance details

Defined in ORYHydra.Model

FromJSON OAuth2Client Source #

FromJSON OAuth2Client

Instance details

Defined in ORYHydra.Model

HasBodyParam UpdateOAuth2Client OAuth2Client Source # 
Instance details

Defined in ORYHydra.API.Admin

Methods

setBodyParam :: (Consumes UpdateOAuth2Client contentType, MimeRender contentType OAuth2Client) => ORYHydraRequest UpdateOAuth2Client contentType res accept -> OAuth2Client -> ORYHydraRequest UpdateOAuth2Client contentType res accept Source #

HasBodyParam CreateOAuth2Client OAuth2Client Source # 
Instance details

Defined in ORYHydra.API.Admin

Methods

setBodyParam :: (Consumes CreateOAuth2Client contentType, MimeRender contentType OAuth2Client) => ORYHydraRequest CreateOAuth2Client contentType res accept -> OAuth2Client -> ORYHydraRequest CreateOAuth2Client contentType res accept Source #

mkOAuth2Client :: OAuth2Client Source #

Construct a value of type OAuth2Client (by applying it's required fields, if any)

OAuth2TokenIntrospection

data OAuth2TokenIntrospection Source #

OAuth2TokenIntrospection Introspection contains an access token's session data as specified by IETF RFC 7662, see:

https://tools.ietf.org/html/rfc7662

Constructors

OAuth2TokenIntrospection 

Fields

mkOAuth2TokenIntrospection Source #

Arguments

:: Bool

oAuth2TokenIntrospectionActive: Active is a boolean indicator of whether or not the presented token is currently active. The specifics of a token's "active" state will vary depending on the implementation of the authorization server and the information it keeps about its tokens, but a "true" value return for the "active" property will generally indicate that a given token has been issued by this authorization server, has not been revoked by the resource owner, and is within its given time window of validity (e.g., after its issuance time and before its expiration time).

-> OAuth2TokenIntrospection 

Construct a value of type OAuth2TokenIntrospection (by applying it's required fields, if any)

Oauth2TokenResponse

mkOauth2TokenResponse :: Oauth2TokenResponse Source #

Construct a value of type Oauth2TokenResponse (by applying it's required fields, if any)

OpenIDConnectContext

data OpenIDConnectContext Source #

OpenIDConnectContext Contains optional information about the OpenID Connect request.

Constructors

OpenIDConnectContext 

Fields

  • openIDConnectContextAcrValues :: Maybe [Text]

    "acr_values" - ACRValues is the Authentication AuthorizationContext Class Reference requested in the OAuth 2.0 Authorization request. It is a parameter defined by OpenID Connect and expresses which level of authentication (e.g. 2FA) is required. OpenID Connect defines it as follows: > Requested Authentication AuthorizationContext Class Reference values. Space-separated string that specifies the acr values that the Authorization Server is being requested to use for processing this Authentication Request, with the values appearing in order of preference. The Authentication AuthorizationContext Class satisfied by the authentication performed is returned as the acr Claim Value, as specified in Section 2. The acr Claim is requested as a Voluntary Claim by this parameter.

  • openIDConnectContextDisplay :: Maybe Text

    "display" - Display is a string value that specifies how the Authorization Server displays the authentication and consent user interface pages to the End-User. The defined values are: page: The Authorization Server SHOULD display the authentication and consent UI consistent with a full User Agent page view. If the display parameter is not specified, this is the default display mode. popup: The Authorization Server SHOULD display the authentication and consent UI consistent with a popup User Agent window. The popup User Agent window should be of an appropriate size for a login-focused dialog and should not obscure the entire window that it is popping up over. touch: The Authorization Server SHOULD display the authentication and consent UI consistent with a device that leverages a touch interface. wap: The Authorization Server SHOULD display the authentication and consent UI consistent with a "feature phone" type display. The Authorization Server MAY also attempt to detect the capabilities of the User Agent and present an appropriate display.

  • openIDConnectContextIdTokenHintClaims :: Maybe Value

    "id_token_hint_claims" - IDTokenHintClaims are the claims of the ID Token previously issued by the Authorization Server being passed as a hint about the End-User's current or past authenticated session with the Client.

  • openIDConnectContextLoginHint :: Maybe Text

    "login_hint" - LoginHint hints about the login identifier the End-User might use to log in (if necessary). This hint can be used by an RP if it first asks the End-User for their e-mail address (or other identifier) and then wants to pass that value as a hint to the discovered authorization service. This value MAY also be a phone number in the format specified for the phone_number Claim. The use of this parameter is optional.

  • openIDConnectContextUiLocales :: Maybe [Text]

    "ui_locales" - UILocales is the End-User'id preferred languages and scripts for the user interface, represented as a space-separated list of BCP47 [RFC5646] language tag values, ordered by preference. For instance, the value "fr-CA fr en" represents a preference for French as spoken in Canada, then French (without a region designation), followed by English (without a region designation). An error SHOULD NOT result if some or all of the requested locales are not supported by the OpenID Provider.

mkOpenIDConnectContext :: OpenIDConnectContext Source #

Construct a value of type OpenIDConnectContext (by applying it's required fields, if any)

PluginConfig

data PluginConfig Source #

PluginConfig PluginConfig The config of a plugin.

Instances

Instances details
Eq PluginConfig Source # 
Instance details

Defined in ORYHydra.Model

Show PluginConfig Source # 
Instance details

Defined in ORYHydra.Model

ToJSON PluginConfig Source #

ToJSON PluginConfig

Instance details

Defined in ORYHydra.Model

FromJSON PluginConfig Source #

FromJSON PluginConfig

Instance details

Defined in ORYHydra.Model

PluginConfigArgs

data PluginConfigArgs Source #

PluginConfigArgs PluginConfigArgs plugin config args

Constructors

PluginConfigArgs 

Fields

mkPluginConfigArgs Source #

Construct a value of type PluginConfigArgs (by applying it's required fields, if any)

PluginConfigInterface

data PluginConfigInterface Source #

PluginConfigInterface PluginConfigInterface The interface between Docker and the plugin

Constructors

PluginConfigInterface 

Fields

mkPluginConfigInterface Source #

Construct a value of type PluginConfigInterface (by applying it's required fields, if any)

PluginConfigLinux

data PluginConfigLinux Source #

PluginConfigLinux PluginConfigLinux plugin config linux

Constructors

PluginConfigLinux 

Fields

mkPluginConfigLinux Source #

Construct a value of type PluginConfigLinux (by applying it's required fields, if any)

PluginConfigNetwork

data PluginConfigNetwork Source #

PluginConfigNetwork PluginConfigNetwork plugin config network

Constructors

PluginConfigNetwork 

Fields

mkPluginConfigNetwork Source #

Construct a value of type PluginConfigNetwork (by applying it's required fields, if any)

PluginConfigRootfs

data PluginConfigRootfs Source #

PluginConfigRootfs PluginConfigRootfs plugin config rootfs

Constructors

PluginConfigRootfs 

Fields

mkPluginConfigRootfs :: PluginConfigRootfs Source #

Construct a value of type PluginConfigRootfs (by applying it's required fields, if any)

PluginConfigUser

data PluginConfigUser Source #

PluginConfigUser PluginConfigUser plugin config user

mkPluginConfigUser :: PluginConfigUser Source #

Construct a value of type PluginConfigUser (by applying it's required fields, if any)

PluginDevice

data PluginDevice Source #

PluginDevice PluginDevice plugin device

Constructors

PluginDevice 

Fields

Instances

Instances details
Eq PluginDevice Source # 
Instance details

Defined in ORYHydra.Model

Show PluginDevice Source # 
Instance details

Defined in ORYHydra.Model

ToJSON PluginDevice Source #

ToJSON PluginDevice

Instance details

Defined in ORYHydra.Model

FromJSON PluginDevice Source #

FromJSON PluginDevice

Instance details

Defined in ORYHydra.Model

mkPluginDevice Source #

Construct a value of type PluginDevice (by applying it's required fields, if any)

PluginEnv

data PluginEnv Source #

PluginEnv PluginEnv plugin env

Constructors

PluginEnv 

Fields

Instances

Instances details
Eq PluginEnv Source # 
Instance details

Defined in ORYHydra.Model

Show PluginEnv Source # 
Instance details

Defined in ORYHydra.Model

ToJSON PluginEnv Source #

ToJSON PluginEnv

Instance details

Defined in ORYHydra.Model

FromJSON PluginEnv Source #

FromJSON PluginEnv

Instance details

Defined in ORYHydra.Model

mkPluginEnv Source #

Arguments

:: Text

pluginEnvDescription: description

-> Text

pluginEnvName: name

-> [Text]

pluginEnvSettable: settable

-> Text

pluginEnvValue: value

-> PluginEnv 

Construct a value of type PluginEnv (by applying it's required fields, if any)

PluginInterfaceType

data PluginInterfaceType Source #

PluginInterfaceType PluginInterfaceType plugin interface type

Constructors

PluginInterfaceType 

Fields

mkPluginInterfaceType Source #

Construct a value of type PluginInterfaceType (by applying it's required fields, if any)

PluginMount

data PluginMount Source #

PluginMount PluginMount plugin mount

Constructors

PluginMount 

Fields

Instances

Instances details
Eq PluginMount Source # 
Instance details

Defined in ORYHydra.Model

Show PluginMount Source # 
Instance details

Defined in ORYHydra.Model

ToJSON PluginMount Source #

ToJSON PluginMount

Instance details

Defined in ORYHydra.Model

FromJSON PluginMount Source #

FromJSON PluginMount

Instance details

Defined in ORYHydra.Model

mkPluginMount Source #

Construct a value of type PluginMount (by applying it's required fields, if any)

PluginSettings

data PluginSettings Source #

PluginSettings PluginSettings Settings that can be modified by users.

Constructors

PluginSettings 

Fields

Instances

Instances details
Eq PluginSettings Source # 
Instance details

Defined in ORYHydra.Model

Show PluginSettings Source # 
Instance details

Defined in ORYHydra.Model

ToJSON PluginSettings Source #

ToJSON PluginSettings

Instance details

Defined in ORYHydra.Model

FromJSON PluginSettings Source #

FromJSON PluginSettings

Instance details

Defined in ORYHydra.Model

mkPluginSettings Source #

Construct a value of type PluginSettings (by applying it's required fields, if any)

PreviousConsentSession

data PreviousConsentSession Source #

PreviousConsentSession The response used to return used consent requests same as HandledLoginRequest, just with consent_request exposed as json

Constructors

PreviousConsentSession 

Fields

mkPreviousConsentSession :: PreviousConsentSession Source #

Construct a value of type PreviousConsentSession (by applying it's required fields, if any)

RejectRequest

data RejectRequest Source #

RejectRequest The request payload used to accept a login or consent request.

Constructors

RejectRequest 

Fields

Instances

Instances details
Eq RejectRequest Source # 
Instance details

Defined in ORYHydra.Model

Show RejectRequest Source # 
Instance details

Defined in ORYHydra.Model

ToJSON RejectRequest Source #

ToJSON RejectRequest

Instance details

Defined in ORYHydra.Model

FromJSON RejectRequest Source #

FromJSON RejectRequest

Instance details

Defined in ORYHydra.Model

ToForm RejectRequest Source #

ToForm RejectRequest

Instance details

Defined in ORYHydra.Model

Methods

toForm :: RejectRequest -> Form #

FromForm RejectRequest Source #

FromForm RejectRequest

Instance details

Defined in ORYHydra.Model

HasBodyParam RejectLogoutRequest RejectRequest Source # 
Instance details

Defined in ORYHydra.API.Admin

Methods

setBodyParam :: (Consumes RejectLogoutRequest contentType, MimeRender contentType RejectRequest) => ORYHydraRequest RejectLogoutRequest contentType res accept -> RejectRequest -> ORYHydraRequest RejectLogoutRequest contentType res accept Source #

HasBodyParam RejectLoginRequest RejectRequest Source # 
Instance details

Defined in ORYHydra.API.Admin

Methods

setBodyParam :: (Consumes RejectLoginRequest contentType, MimeRender contentType RejectRequest) => ORYHydraRequest RejectLoginRequest contentType res accept -> RejectRequest -> ORYHydraRequest RejectLoginRequest contentType res accept Source #

HasBodyParam RejectConsentRequest RejectRequest Source # 
Instance details

Defined in ORYHydra.API.Admin

Methods

setBodyParam :: (Consumes RejectConsentRequest contentType, MimeRender contentType RejectRequest) => ORYHydraRequest RejectConsentRequest contentType res accept -> RejectRequest -> ORYHydraRequest RejectConsentRequest contentType res accept Source #

mkRejectRequest :: RejectRequest Source #

Construct a value of type RejectRequest (by applying it's required fields, if any)

UserinfoResponse

data UserinfoResponse Source #

UserinfoResponse The userinfo response

Constructors

UserinfoResponse 

Fields

  • userinfoResponseBirthdate :: Maybe Text

    "birthdate" - End-User's birthday, represented as an ISO 8601:2004 [ISO8601‑2004] YYYY-MM-DD format. The year MAY be 0000, indicating that it is omitted. To represent only the year, YYYY format is allowed. Note that depending on the underlying platform's date related function, providing just year can result in varying month and day, so the implementers need to take this factor into account to correctly process the dates.

  • userinfoResponseEmail :: Maybe Text

    "email" - End-User's preferred e-mail address. Its value MUST conform to the RFC 5322 [RFC5322] addr-spec syntax. The RP MUST NOT rely upon this value being unique, as discussed in Section 5.7.

  • userinfoResponseEmailVerified :: Maybe Bool

    "email_verified" - True if the End-User's e-mail address has been verified; otherwise false. When this Claim Value is true, this means that the OP took affirmative steps to ensure that this e-mail address was controlled by the End-User at the time the verification was performed. The means by which an e-mail address is verified is context-specific, and dependent upon the trust framework or contractual agreements within which the parties are operating.

  • userinfoResponseFamilyName :: Maybe Text

    "family_name" - Surname(s) or last name(s) of the End-User. Note that in some cultures, people can have multiple family names or no family name; all can be present, with the names being separated by space characters.

  • userinfoResponseGender :: Maybe Text

    "gender" - End-User's gender. Values defined by this specification are female and male. Other values MAY be used when neither of the defined values are applicable.

  • userinfoResponseGivenName :: Maybe Text

    "given_name" - Given name(s) or first name(s) of the End-User. Note that in some cultures, people can have multiple given names; all can be present, with the names being separated by space characters.

  • userinfoResponseLocale :: Maybe Text

    "locale" - End-User's locale, represented as a BCP47 [RFC5646] language tag. This is typically an ISO 639-1 Alpha-2 [ISO639‑1] language code in lowercase and an ISO 3166-1 Alpha-2 [ISO3166‑1] country code in uppercase, separated by a dash. For example, en-US or fr-CA. As a compatibility note, some implementations have used an underscore as the separator rather than a dash, for example, en_US; Relying Parties MAY choose to accept this locale syntax as well.

  • userinfoResponseMiddleName :: Maybe Text

    "middle_name" - Middle name(s) of the End-User. Note that in some cultures, people can have multiple middle names; all can be present, with the names being separated by space characters. Also note that in some cultures, middle names are not used.

  • userinfoResponseName :: Maybe Text

    "name" - End-User's full name in displayable form including all name parts, possibly including titles and suffixes, ordered according to the End-User's locale and preferences.

  • userinfoResponseNickname :: Maybe Text

    "nickname" - Casual name of the End-User that may or may not be the same as the given_name. For instance, a nickname value of Mike might be returned alongside a given_name value of Michael.

  • userinfoResponsePhoneNumber :: Maybe Text

    "phone_number" - End-User's preferred telephone number. E.164 [E.164] is RECOMMENDED as the format of this Claim, for example, +1 (425) 555-1212 or +56 (2) 687 2400. If the phone number contains an extension, it is RECOMMENDED that the extension be represented using the RFC 3966 [RFC3966] extension syntax, for example, +1 (604) 555-1234;ext=5678.

  • userinfoResponsePhoneNumberVerified :: Maybe Bool

    "phone_number_verified" - True if the End-User's phone number has been verified; otherwise false. When this Claim Value is true, this means that the OP took affirmative steps to ensure that this phone number was controlled by the End-User at the time the verification was performed. The means by which a phone number is verified is context-specific, and dependent upon the trust framework or contractual agreements within which the parties are operating. When true, the phone_number Claim MUST be in E.164 format and any extensions MUST be represented in RFC 3966 format.

  • userinfoResponsePicture :: Maybe Text

    "picture" - URL of the End-User's profile picture. This URL MUST refer to an image file (for example, a PNG, JPEG, or GIF image file), rather than to a Web page containing an image. Note that this URL SHOULD specifically reference a profile photo of the End-User suitable for displaying when describing the End-User, rather than an arbitrary photo taken by the End-User.

  • userinfoResponsePreferredUsername :: Maybe Text

    "preferred_username" - Non-unique shorthand name by which the End-User wishes to be referred to at the RP, such as janedoe or j.doe. This value MAY be any valid JSON string including special characters such as @, /, or whitespace.

  • userinfoResponseProfile :: Maybe Text

    "profile" - URL of the End-User's profile page. The contents of this Web page SHOULD be about the End-User.

  • userinfoResponseSub :: Maybe Text

    "sub" - Subject - Identifier for the End-User at the IssuerURL.

  • userinfoResponseUpdatedAt :: Maybe Integer

    "updated_at" - Time the End-User's information was last updated. Its value is a JSON number representing the number of seconds from 1970-01-01T0:0:0Z as measured in UTC until the date/time.

  • userinfoResponseWebsite :: Maybe Text

    "website" - URL of the End-User's Web page or blog. This Web page SHOULD contain information published by the End-User or an organization that the End-User is affiliated with.

  • userinfoResponseZoneinfo :: Maybe Text

    "zoneinfo" - String from zoneinfo [zoneinfo] time zone database representing the End-User's time zone. For example, EuropeParis or AmericaLos_Angeles.

mkUserinfoResponse :: UserinfoResponse Source #

Construct a value of type UserinfoResponse (by applying it's required fields, if any)

Version

data Version Source #

Version

Constructors

Version 

Fields

Instances

Instances details
Eq Version Source # 
Instance details

Defined in ORYHydra.Model

Methods

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

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

Show Version Source # 
Instance details

Defined in ORYHydra.Model

ToJSON Version Source #

ToJSON Version

Instance details

Defined in ORYHydra.Model

FromJSON Version Source #

FromJSON Version

Instance details

Defined in ORYHydra.Model

mkVersion :: Version Source #

Construct a value of type Version (by applying it's required fields, if any)

Volume

data Volume Source #

Volume Volume volume

Constructors

Volume 

Fields

Instances

Instances details
Eq Volume Source # 
Instance details

Defined in ORYHydra.Model

Methods

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

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

Show Volume Source # 
Instance details

Defined in ORYHydra.Model

ToJSON Volume Source #

ToJSON Volume

Instance details

Defined in ORYHydra.Model

FromJSON Volume Source #

FromJSON Volume

Instance details

Defined in ORYHydra.Model

mkVolume Source #

Arguments

:: Text

volumeDriver: Name of the volume driver used by the volume.

-> Map String Text

volumeLabels: User-defined key/value metadata.

-> Text

volumeMountpoint: Mount path of the volume on the host.

-> Text

volumeName: Name of the volume.

-> Map String Text

volumeOptions: The driver specific options used when creating the volume.

-> Text

volumeScope: The level at which the volume exists. Either global for cluster-wide, or local for machine level.

-> Volume 

Construct a value of type Volume (by applying it's required fields, if any)

VolumeUsageData

data VolumeUsageData Source #

VolumeUsageData VolumeUsageData Usage details about the volume. This information is used by the `GET systemdf` endpoint, and omitted in other endpoints.

Constructors

VolumeUsageData 

Fields

  • volumeUsageDataRefCount :: Integer

    Required RefCount - The number of containers referencing this volume. This field is set to `-1` if the reference-count is not available.

  • volumeUsageDataSize :: Integer

    Required Size - Amount of disk space used by the volume (in bytes). This information is only available for volumes created with the `"local"` volume driver. For volumes created with other volume drivers, this field is set to `-1` ("not available")

mkVolumeUsageData Source #

Arguments

:: Integer

volumeUsageDataRefCount: The number of containers referencing this volume. This field is set to `-1` if the reference-count is not available.

-> Integer

volumeUsageDataSize: Amount of disk space used by the volume (in bytes). This information is only available for volumes created with the `"local"` volume driver. For volumes created with other volume drivers, this field is set to `-1` ("not available")

-> VolumeUsageData 

Construct a value of type VolumeUsageData (by applying it's required fields, if any)

WellKnown

data WellKnown Source #

WellKnown WellKnown represents important OpenID Connect discovery metadata

It includes links to several endpoints (e.g. oauth2token) and exposes information on supported signature algorithms among others.

Constructors

WellKnown 

Fields

  • wellKnownAuthorizationEndpoint :: Text

    Required "authorization_endpoint" - URL of the OP's OAuth 2.0 Authorization Endpoint.

  • wellKnownBackchannelLogoutSessionSupported :: Maybe Bool

    "backchannel_logout_session_supported" - Boolean value specifying whether the OP can pass a sid (session ID) Claim in the Logout Token to identify the RP session with the OP. If supported, the sid Claim is also included in ID Tokens issued by the OP

  • wellKnownBackchannelLogoutSupported :: Maybe Bool

    "backchannel_logout_supported" - Boolean value specifying whether the OP supports back-channel logout, with true indicating support.

  • wellKnownClaimsParameterSupported :: Maybe Bool

    "claims_parameter_supported" - Boolean value specifying whether the OP supports use of the claims parameter, with true indicating support.

  • wellKnownClaimsSupported :: Maybe [Text]

    "claims_supported" - JSON array containing a list of the Claim Names of the Claims that the OpenID Provider MAY be able to supply values for. Note that for privacy or other reasons, this might not be an exhaustive list.

  • wellKnownEndSessionEndpoint :: Maybe Text

    "end_session_endpoint" - URL at the OP to which an RP can perform a redirect to request that the End-User be logged out at the OP.

  • wellKnownFrontchannelLogoutSessionSupported :: Maybe Bool

    "frontchannel_logout_session_supported" - Boolean value specifying whether the OP can pass iss (issuer) and sid (session ID) query parameters to identify the RP session with the OP when the frontchannel_logout_uri is used. If supported, the sid Claim is also included in ID Tokens issued by the OP.

  • wellKnownFrontchannelLogoutSupported :: Maybe Bool

    "frontchannel_logout_supported" - Boolean value specifying whether the OP supports HTTP-based logout, with true indicating support.

  • wellKnownGrantTypesSupported :: Maybe [Text]

    "grant_types_supported" - JSON array containing a list of the OAuth 2.0 Grant Type values that this OP supports.

  • wellKnownIdTokenSigningAlgValuesSupported :: [Text]

    Required "id_token_signing_alg_values_supported" - JSON array containing a list of the JWS signing algorithms (alg values) supported by the OP for the ID Token to encode the Claims in a JWT.

  • wellKnownIssuer :: Text

    Required "issuer" - URL using the https scheme with no query or fragment component that the OP asserts as its IssuerURL Identifier. If IssuerURL discovery is supported , this value MUST be identical to the issuer value returned by WebFinger. This also MUST be identical to the iss Claim value in ID Tokens issued from this IssuerURL.

  • wellKnownJwksUri :: Text

    Required "jwks_uri" - URL of the OP's JSON Web Key Set [JWK] document. This contains the signing key(s) the RP uses to validate signatures from the OP. The JWK Set MAY also contain the Server's encryption key(s), which are used by RPs to encrypt requests to the Server. When both signing and encryption keys are made available, a use (Key Use) parameter value is REQUIRED for all keys in the referenced JWK Set to indicate each key's intended usage. Although some algorithms allow the same key to be used for both signatures and encryption, doing so is NOT RECOMMENDED, as it is less secure. The JWK x5c parameter MAY be used to provide X.509 representations of keys provided. When used, the bare key values MUST still be present and MUST match those in the certificate.

  • wellKnownRegistrationEndpoint :: Maybe Text

    "registration_endpoint" - URL of the OP's Dynamic Client Registration Endpoint.

  • wellKnownRequestObjectSigningAlgValuesSupported :: Maybe [Text]

    "request_object_signing_alg_values_supported" - JSON array containing a list of the JWS signing algorithms (alg values) supported by the OP for Request Objects, which are described in Section 6.1 of OpenID Connect Core 1.0 [OpenID.Core]. These algorithms are used both when the Request Object is passed by value (using the request parameter) and when it is passed by reference (using the request_uri parameter).

  • wellKnownRequestParameterSupported :: Maybe Bool

    "request_parameter_supported" - Boolean value specifying whether the OP supports use of the request parameter, with true indicating support.

  • wellKnownRequestUriParameterSupported :: Maybe Bool

    "request_uri_parameter_supported" - Boolean value specifying whether the OP supports use of the request_uri parameter, with true indicating support.

  • wellKnownRequireRequestUriRegistration :: Maybe Bool

    "require_request_uri_registration" - Boolean value specifying whether the OP requires any request_uri values used to be pre-registered using the request_uris registration parameter.

  • wellKnownResponseModesSupported :: Maybe [Text]

    "response_modes_supported" - JSON array containing a list of the OAuth 2.0 response_mode values that this OP supports.

  • wellKnownResponseTypesSupported :: [Text]

    Required "response_types_supported" - JSON array containing a list of the OAuth 2.0 response_type values that this OP supports. Dynamic OpenID Providers MUST support the code, id_token, and the token id_token Response Type values.

  • wellKnownRevocationEndpoint :: Maybe Text

    "revocation_endpoint" - URL of the authorization server's OAuth 2.0 revocation endpoint.

  • wellKnownScopesSupported :: Maybe [Text]

    "scopes_supported" - SON array containing a list of the OAuth 2.0 [RFC6749] scope values that this server supports. The server MUST support the openid scope value. Servers MAY choose not to advertise some supported scope values even when this parameter is used

  • wellKnownSubjectTypesSupported :: [Text]

    Required "subject_types_supported" - JSON array containing a list of the Subject Identifier types that this OP supports. Valid types include pairwise and public.

  • wellKnownTokenEndpoint :: Text

    Required "token_endpoint" - URL of the OP's OAuth 2.0 Token Endpoint

  • wellKnownTokenEndpointAuthMethodsSupported :: Maybe [Text]

    "token_endpoint_auth_methods_supported" - JSON array containing a list of Client Authentication methods supported by this Token Endpoint. The options are client_secret_post, client_secret_basic, client_secret_jwt, and private_key_jwt, as described in Section 9 of OpenID Connect Core 1.0

  • wellKnownUserinfoEndpoint :: Maybe Text

    "userinfo_endpoint" - URL of the OP's UserInfo Endpoint.

  • wellKnownUserinfoSigningAlgValuesSupported :: Maybe [Text]

    "userinfo_signing_alg_values_supported" - JSON array containing a list of the JWS [JWS] signing algorithms (alg values) [JWA] supported by the UserInfo Endpoint to encode the Claims in a JWT [JWT].

Instances

Instances details
Eq WellKnown Source # 
Instance details

Defined in ORYHydra.Model

Show WellKnown Source # 
Instance details

Defined in ORYHydra.Model

ToJSON WellKnown Source #

ToJSON WellKnown

Instance details

Defined in ORYHydra.Model

FromJSON WellKnown Source #

FromJSON WellKnown

Instance details

Defined in ORYHydra.Model

mkWellKnown Source #

Arguments

:: Text

wellKnownAuthorizationEndpoint: URL of the OP's OAuth 2.0 Authorization Endpoint.

-> [Text]

wellKnownIdTokenSigningAlgValuesSupported: JSON array containing a list of the JWS signing algorithms (alg values) supported by the OP for the ID Token to encode the Claims in a JWT.

-> Text

wellKnownIssuer: URL using the https scheme with no query or fragment component that the OP asserts as its IssuerURL Identifier. If IssuerURL discovery is supported , this value MUST be identical to the issuer value returned by WebFinger. This also MUST be identical to the iss Claim value in ID Tokens issued from this IssuerURL.

-> Text

wellKnownJwksUri: URL of the OP's JSON Web Key Set [JWK] document. This contains the signing key(s) the RP uses to validate signatures from the OP. The JWK Set MAY also contain the Server's encryption key(s), which are used by RPs to encrypt requests to the Server. When both signing and encryption keys are made available, a use (Key Use) parameter value is REQUIRED for all keys in the referenced JWK Set to indicate each key's intended usage. Although some algorithms allow the same key to be used for both signatures and encryption, doing so is NOT RECOMMENDED, as it is less secure. The JWK x5c parameter MAY be used to provide X.509 representations of keys provided. When used, the bare key values MUST still be present and MUST match those in the certificate.

-> [Text]

wellKnownResponseTypesSupported: JSON array containing a list of the OAuth 2.0 response_type values that this OP supports. Dynamic OpenID Providers MUST support the code, id_token, and the token id_token Response Type values.

-> [Text]

wellKnownSubjectTypesSupported: JSON array containing a list of the Subject Identifier types that this OP supports. Valid types include pairwise and public.

-> Text

wellKnownTokenEndpoint: URL of the OP's OAuth 2.0 Token Endpoint

-> WellKnown 

Construct a value of type WellKnown (by applying it's required fields, if any)

Auth Methods

AuthBasicBasic

data AuthBasicBasic Source #

Constructors

AuthBasicBasic ByteString ByteString

username password

Instances

Instances details
Eq AuthBasicBasic Source # 
Instance details

Defined in ORYHydra.Model

Show AuthBasicBasic Source # 
Instance details

Defined in ORYHydra.Model

AuthMethod AuthBasicBasic Source # 
Instance details

Defined in ORYHydra.Model

Methods

applyAuthMethod :: ORYHydraConfig -> AuthBasicBasic -> ORYHydraRequest req contentType res accept -> IO (ORYHydraRequest req contentType res accept) Source #

AuthOAuthOauth2

data AuthOAuthOauth2 Source #

Constructors

AuthOAuthOauth2 Text

secret

Instances

Instances details
Eq AuthOAuthOauth2 Source # 
Instance details

Defined in ORYHydra.Model

Show AuthOAuthOauth2 Source # 
Instance details

Defined in ORYHydra.Model

AuthMethod AuthOAuthOauth2 Source # 
Instance details

Defined in ORYHydra.Model

Methods

applyAuthMethod :: ORYHydraConfig -> AuthOAuthOauth2 -> ORYHydraRequest req contentType res accept -> IO (ORYHydraRequest req contentType res accept) Source #