Safe Haskell | None |
---|---|
Language | Haskell2010 |
OryKratos.Types
Synopsis
- data AdminCreateIdentityBody = AdminCreateIdentityBody {}
- data AdminCreateIdentityImportCredentialsOidc = AdminCreateIdentityImportCredentialsOidc {}
- data AdminCreateIdentityImportCredentialsOidcConfig = AdminCreateIdentityImportCredentialsOidcConfig {}
- data AdminCreateIdentityImportCredentialsOidcProvider = AdminCreateIdentityImportCredentialsOidcProvider {}
- data AdminCreateIdentityImportCredentialsPassword = AdminCreateIdentityImportCredentialsPassword {}
- data AdminCreateIdentityImportCredentialsPasswordConfig = AdminCreateIdentityImportCredentialsPasswordConfig {}
- data AdminCreateSelfServiceRecoveryLinkBody = AdminCreateSelfServiceRecoveryLinkBody {
- expires_in :: Maybe Text
- identity_id :: Text
- data AdminIdentityImportCredentials = AdminIdentityImportCredentials {}
- data AdminUpdateIdentityBody = AdminUpdateIdentityBody {}
- data Identity traits metadataAdmin metadataPublic = Identity {
- created_at :: Maybe UTCTime
- credentials :: Maybe (Map String IdentityCredentials)
- id :: UUID
- metadata_admin :: Maybe metadataAdmin
- metadata_public :: Maybe metadataPublic
- recovery_addresses :: Maybe [RecoveryAddress]
- schema_id :: Text
- schema_url :: Text
- state :: Maybe IdentityState
- state_changed_at :: Maybe UTCTime
- traits :: traits
- updated_at :: Maybe UTCTime
- verifiable_addresses :: Maybe [VerifiableIdentityAddress]
- type UntypedIdentity = Identity Value Value Value
- data IdentityCredentials = IdentityCredentials {}
- data IdentityCredentialsOidc = IdentityCredentialsOidc {}
- data IdentityCredentialsOidcProvider = IdentityCredentialsOidcProvider {}
- data IdentityCredentialsPassword = IdentityCredentialsPassword {}
- data IdentityCredentialsType
- = Password
- | TOTP
- | OIDC
- | WebAuthn
- | LookupSecret
- data IdentitySchema = IdentitySchema {}
- data IdentityState
- data Session traits metadataAdmin metadataPublic = Session {
- active :: Maybe Bool
- authenticated_at :: Maybe UTCTime
- authentication_methods :: Maybe [SessionAuthenticationMethod]
- authenticator_assurance_level :: Maybe AuthenticatorAssuranceLevel
- expires_at :: Maybe UTCTime
- id :: UUID
- identity :: Identity traits metadataAdmin metadataPublic
- issued_at :: Maybe UTCTime
- data SettingsProfileFormConfig = SettingsProfileFormConfig {}
- data SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic = SuccessfulSelfServiceLoginWithoutBrowser {
- session :: Session traits metadataAdmin metadataPublic
- session_token :: Maybe Text
- data SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic = SuccessfulSelfServiceRegistrationWithoutBrowser {}
- data SubmitSelfServiceLoginFlowBody = SubmitSelfServiceLoginFlowBody {
- csrf_token :: Maybe Text
- identifier :: Text
- method :: Text
- password :: Text
- password_identifier :: Maybe Text
- provider :: Text
- traits :: Maybe Value
- totp_code :: Text
- webauthn_login :: Maybe Text
- lookup_secret :: Text
- data SubmitSelfServiceLoginFlowWithLookupSecretMethodBody = SubmitSelfServiceLoginFlowWithLookupSecretMethodBody {
- csrf_token :: Maybe Text
- lookup_secret :: Text
- method :: Text
- data SubmitSelfServiceLoginFlowWithOidcMethodBody = SubmitSelfServiceLoginFlowWithOidcMethodBody {}
- data SubmitSelfServiceLoginFlowWithPasswordMethodBody = SubmitSelfServiceLoginFlowWithPasswordMethodBody {
- csrf_token :: Maybe Text
- identifier :: Text
- method :: Text
- password :: Text
- password_identifier :: Maybe Text
- data SubmitSelfServiceLoginFlowWithTotpMethodBody = SubmitSelfServiceLoginFlowWithTotpMethodBody {}
- data SubmitSelfServiceLoginFlowWithWebAuthnMethodBody = SubmitSelfServiceLoginFlowWithWebAuthnMethodBody {
- csrf_token :: Maybe Text
- identifier :: Maybe Text
- method :: Text
- webauthn_login :: Maybe Text
- data SubmitSelfServiceLogoutFlowWithoutBrowserBody = SubmitSelfServiceLogoutFlowWithoutBrowserBody {}
- data SubmitSelfServiceRecoveryFlowBody = SubmitSelfServiceRecoveryFlowBody {}
- data SubmitSelfServiceRecoveryFlowWithLinkMethodBody = SubmitSelfServiceRecoveryFlowWithLinkMethodBody {}
- data SubmitSelfServiceRegistrationFlowBody = SubmitSelfServiceRegistrationFlowBody {}
- data SubmitSelfServiceRegistrationFlowWithOidcMethodBody = SubmitSelfServiceRegistrationFlowWithOidcMethodBody {}
- data SubmitSelfServiceRegistrationFlowWithPasswordMethodBody = SubmitSelfServiceRegistrationFlowWithPasswordMethodBody {}
- data SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody = SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody {}
- data SubmitSelfServiceSettingsFlowBody = SubmitSelfServiceSettingsFlowBody {
- csrf_token :: Maybe Text
- method :: Text
- password :: Text
- traits :: Value
- flow :: Maybe Text
- link :: Maybe Text
- unlink :: Maybe Text
- totp_code :: Maybe Text
- totp_unlink :: Maybe Bool
- webauthn_register :: Maybe Text
- webauthn_register_displayname :: Maybe Text
- webauthn_remove :: Maybe Text
- lookup_secret_confirm :: Maybe Bool
- lookup_secret_disable :: Maybe Bool
- lookup_secret_regenerate :: Maybe Bool
- lookup_secret_reveal :: Maybe Bool
- data SubmitSelfServiceSettingsFlowWithLookupMethodBody = SubmitSelfServiceSettingsFlowWithLookupMethodBody {}
- data SubmitSelfServiceSettingsFlowWithOidcMethodBody = SubmitSelfServiceSettingsFlowWithOidcMethodBody {}
- data SubmitSelfServiceSettingsFlowWithPasswordMethodBody = SubmitSelfServiceSettingsFlowWithPasswordMethodBody {}
- data SubmitSelfServiceSettingsFlowWithProfileMethodBody = SubmitSelfServiceSettingsFlowWithProfileMethodBody {}
- data SubmitSelfServiceSettingsFlowWithTotpMethodBody = SubmitSelfServiceSettingsFlowWithTotpMethodBody {}
- data SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody = SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody {}
- data SubmitSelfServiceVerificationFlowBody = SubmitSelfServiceVerificationFlowBody {}
- data SubmitSelfServiceVerificationFlowWithLinkMethodBody = SubmitSelfServiceVerificationFlowWithLinkMethodBody {}
- data SelfServiceBrowserLocationChangeRequiredError = SelfServiceBrowserLocationChangeRequiredError {}
- data SelfServiceError = SelfServiceError {}
- data SelfServiceFlowExpiredError = SelfServiceFlowExpiredError {}
- data SelfServiceLoginFlow = SelfServiceLoginFlow {}
- data SelfServiceLogoutUrl = SelfServiceLogoutUrl {
- logout_token :: Text
- logout_url :: Text
- data SelfServiceRecoveryFlow = SelfServiceRecoveryFlow {
- active :: Maybe Text
- expires_at :: UTCTime
- id :: UUID
- issued_at :: UTCTime
- request_url :: Text
- return_to :: Maybe Text
- state :: SelfServiceRecoveryFlowState
- _type :: Text
- ui :: UiContainer
- data SelfServiceRecoveryFlowState
- data SelfServiceRecoveryLink = SelfServiceRecoveryLink {}
- data SelfServiceRegistrationFlow = SelfServiceRegistrationFlow {
- active :: Maybe IdentityCredentialsType
- expires_at :: UTCTime
- id :: UUID
- issued_at :: UTCTime
- request_url :: Text
- return_to :: Maybe Text
- _type :: Text
- ui :: UiContainer
- data SelfServiceSettingsFlow traits metadataAdmin metadataPublic = SelfServiceSettingsFlow {}
- data SelfServiceSettingsFlowState
- data SelfServiceVerificationFlow = SelfServiceVerificationFlow {}
- data SelfServiceVerificationFlowState
- data AuthenticatorAssuranceLevel
- data ErrorAuthenticatorAssuranceLevelNotSatisfied = ErrorAuthenticatorAssuranceLevelNotSatisfied {}
- data GenericError = GenericError {}
- data GetVersion200Response = GetVersion200Response {}
- data HealthNotReadyStatus = HealthNotReadyStatus {}
- data HealthStatus = HealthStatus {}
- data IsAlive200Response = IsAlive200Response {}
- data IsReady503Response = IsReady503Response {}
- data JsonError = JsonError {}
- data NeedsPrivilegedSessionError = NeedsPrivilegedSessionError {}
- data Pagination = Pagination {}
- data RecoveryAddress = RecoveryAddress {}
- data RevokedSessions = RevokedSessions {}
- data SessionAuthenticationMethod = SessionAuthenticationMethod {}
- data SessionDevice = SessionDevice {
- user_agent :: Maybe Text
- data SubmitSelfServiceFlowWithWebAuthnRegistrationMethod = SubmitSelfServiceFlowWithWebAuthnRegistrationMethod {}
- data VerifiableIdentityAddress = VerifiableIdentityAddress {}
- data Version = Version {}
- data UiContainer = UiContainer {}
- data UiNode = UiNode {
- attributes :: UiNodeAttributes
- group :: Text
- messages :: [UiText]
- meta :: UiNodeMeta
- _type :: Text
- data UiNodeAnchorAttributes = UiNodeAnchorAttributes {}
- data UiNodeAttributes = UiNodeAttributes {
- disabled :: Bool
- label :: Maybe UiText
- name :: Text
- node_type :: Text
- onclick :: Maybe Text
- _pattern :: Maybe Text
- required :: Maybe Bool
- _type :: Text
- value :: Maybe Value
- id :: Text
- text :: UiText
- height :: Integer
- src :: Text
- width :: Integer
- href :: Text
- title :: UiText
- async :: Bool
- crossorigin :: Text
- integrity :: Text
- nonce :: Text
- referrerpolicy :: Text
- data UiNodeImageAttributes = UiNodeImageAttributes {}
- data UiNodeInputAttributes = UiNodeInputAttributes {}
- data UiNodeMeta = UiNodeMeta {}
- data UiNodeScriptAttributes = UiNodeScriptAttributes {}
- data UiNodeTextAttributes = UiNodeTextAttributes {}
- data UiText = UiText {}
Documentation
data AdminCreateIdentityBody Source #
Constructors
AdminCreateIdentityBody | |
Fields
|
Instances
data AdminCreateIdentityImportCredentialsOidc Source #
Constructors
AdminCreateIdentityImportCredentialsOidc | |
Instances
data AdminCreateIdentityImportCredentialsOidcConfig Source #
Constructors
AdminCreateIdentityImportCredentialsOidcConfig | |
Fields
|
Instances
data AdminCreateIdentityImportCredentialsOidcProvider Source #
Constructors
AdminCreateIdentityImportCredentialsOidcProvider | |
Instances
data AdminCreateIdentityImportCredentialsPassword Source #
Constructors
AdminCreateIdentityImportCredentialsPassword | |
Instances
data AdminCreateIdentityImportCredentialsPasswordConfig Source #
Constructors
AdminCreateIdentityImportCredentialsPasswordConfig | |
Fields
|
Instances
data AdminCreateSelfServiceRecoveryLinkBody Source #
Constructors
AdminCreateSelfServiceRecoveryLinkBody | |
Fields
|
Instances
data AdminIdentityImportCredentials Source #
Constructors
AdminIdentityImportCredentials | |
Instances
data AdminUpdateIdentityBody Source #
Constructors
AdminUpdateIdentityBody | |
Fields
|
Instances
data Identity traits metadataAdmin metadataPublic Source #
An identity can be a real human, a service, an IoT device - everything that can be described as an "actor" in a system.
Constructors
Identity | |
Fields
|
Instances
(Eq metadataAdmin, Eq metadataPublic, Eq traits) => Eq (Identity traits metadataAdmin metadataPublic) Source # | |
(Data traits, Data metadataAdmin, Data metadataPublic) => Data (Identity traits metadataAdmin metadataPublic) Source # | |
Defined in OryKratos.Types.Identity Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Identity traits metadataAdmin metadataPublic -> c (Identity traits metadataAdmin metadataPublic) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Identity traits metadataAdmin metadataPublic) # toConstr :: Identity traits metadataAdmin metadataPublic -> Constr # dataTypeOf :: Identity traits metadataAdmin metadataPublic -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Identity traits metadataAdmin metadataPublic)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Identity traits metadataAdmin metadataPublic)) # gmapT :: (forall b. Data b => b -> b) -> Identity traits metadataAdmin metadataPublic -> Identity traits metadataAdmin metadataPublic # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Identity traits metadataAdmin metadataPublic -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Identity traits metadataAdmin metadataPublic -> r # gmapQ :: (forall d. Data d => d -> u) -> Identity traits metadataAdmin metadataPublic -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Identity traits metadataAdmin metadataPublic -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Identity traits metadataAdmin metadataPublic -> m (Identity traits metadataAdmin metadataPublic) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Identity traits metadataAdmin metadataPublic -> m (Identity traits metadataAdmin metadataPublic) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Identity traits metadataAdmin metadataPublic -> m (Identity traits metadataAdmin metadataPublic) # | |
(Show metadataAdmin, Show metadataPublic, Show traits) => Show (Identity traits metadataAdmin metadataPublic) Source # | |
Generic (Identity traits metadataAdmin metadataPublic) Source # | |
Defined in OryKratos.Types.Identity | |
(ToJSON traits, ToJSON metadataAdmin, ToJSON metadataPublic) => ToJSON (Identity traits metadataAdmin metadataPublic) Source # | |
Defined in OryKratos.Types.Identity | |
(FromJSON traits, FromJSON metadataAdmin, FromJSON metadataPublic) => FromJSON (Identity traits metadataAdmin metadataPublic) Source # | |
type Rep (Identity traits metadataAdmin metadataPublic) Source # | |
Defined in OryKratos.Types.Identity type Rep (Identity traits metadataAdmin metadataPublic) = D1 ('MetaData "Identity" "OryKratos.Types.Identity" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "Identity" 'PrefixI 'True) (((S1 ('MetaSel ('Just "created_at") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe UTCTime)) :*: (S1 ('MetaSel ('Just "credentials") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (Map String IdentityCredentials))) :*: S1 ('MetaSel ('Just "id") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UUID))) :*: (S1 ('MetaSel ('Just "metadata_admin") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe metadataAdmin)) :*: (S1 ('MetaSel ('Just "metadata_public") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe metadataPublic)) :*: S1 ('MetaSel ('Just "recovery_addresses") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe [RecoveryAddress]))))) :*: ((S1 ('MetaSel ('Just "schema_id") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: (S1 ('MetaSel ('Just "schema_url") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "state") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe IdentityState)))) :*: ((S1 ('MetaSel ('Just "state_changed_at") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe UTCTime)) :*: S1 ('MetaSel ('Just "traits") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 traits)) :*: (S1 ('MetaSel ('Just "updated_at") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe UTCTime)) :*: S1 ('MetaSel ('Just "verifiable_addresses") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe [VerifiableIdentityAddress]))))))) |
data IdentityCredentials Source #
Credentials represents a specific credential type
Constructors
IdentityCredentials | |
Fields
|
Instances
data IdentityCredentialsOidc Source #
Constructors
IdentityCredentialsOidc | |
Fields |
Instances
data IdentityCredentialsOidcProvider Source #
Constructors
IdentityCredentialsOidcProvider | |
Fields |
Instances
data IdentityCredentialsPassword Source #
Constructors
IdentityCredentialsPassword | |
Fields
|
Instances
data IdentityCredentialsType Source #
and so on.
Constructors
Password | |
TOTP | |
OIDC | |
WebAuthn | |
LookupSecret |
Instances
data IdentitySchema Source #
Constructors
IdentitySchema | |
Instances
data IdentityState Source #
The state can either be `active` or `inactive`.
Constructors
IdentityStateActive | |
IdentityStateInactive |
Instances
data Session traits metadataAdmin metadataPublic Source #
A Session
Constructors
Session | |
Fields
|
Instances
(Eq metadataAdmin, Eq metadataPublic, Eq traits) => Eq (Session traits metadataAdmin metadataPublic) Source # | |
(Data traits, Data metadataAdmin, Data metadataPublic) => Data (Session traits metadataAdmin metadataPublic) Source # | |
Defined in OryKratos.Types.Other Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Session traits metadataAdmin metadataPublic -> c (Session traits metadataAdmin metadataPublic) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Session traits metadataAdmin metadataPublic) # toConstr :: Session traits metadataAdmin metadataPublic -> Constr # dataTypeOf :: Session traits metadataAdmin metadataPublic -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Session traits metadataAdmin metadataPublic)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Session traits metadataAdmin metadataPublic)) # gmapT :: (forall b. Data b => b -> b) -> Session traits metadataAdmin metadataPublic -> Session traits metadataAdmin metadataPublic # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Session traits metadataAdmin metadataPublic -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Session traits metadataAdmin metadataPublic -> r # gmapQ :: (forall d. Data d => d -> u) -> Session traits metadataAdmin metadataPublic -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Session traits metadataAdmin metadataPublic -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Session traits metadataAdmin metadataPublic -> m (Session traits metadataAdmin metadataPublic) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Session traits metadataAdmin metadataPublic -> m (Session traits metadataAdmin metadataPublic) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Session traits metadataAdmin metadataPublic -> m (Session traits metadataAdmin metadataPublic) # | |
(Show metadataAdmin, Show metadataPublic, Show traits) => Show (Session traits metadataAdmin metadataPublic) Source # | |
Generic (Session traits metadataAdmin metadataPublic) Source # | |
Defined in OryKratos.Types.Other | |
(ToJSON traits, ToJSON metadataAdmin, ToJSON metadataPublic) => ToJSON (Session traits metadataAdmin metadataPublic) Source # | |
Defined in OryKratos.Types.Other | |
(FromJSON traits, FromJSON metadataAdmin, FromJSON metadataPublic) => FromJSON (Session traits metadataAdmin metadataPublic) Source # | |
type Rep (Session traits metadataAdmin metadataPublic) Source # | |
Defined in OryKratos.Types.Other type Rep (Session traits metadataAdmin metadataPublic) = D1 ('MetaData "Session" "OryKratos.Types.Other" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "Session" 'PrefixI 'True) (((S1 ('MetaSel ('Just "active") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool)) :*: S1 ('MetaSel ('Just "authenticated_at") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe UTCTime))) :*: (S1 ('MetaSel ('Just "authentication_methods") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe [SessionAuthenticationMethod])) :*: S1 ('MetaSel ('Just "authenticator_assurance_level") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe AuthenticatorAssuranceLevel)))) :*: ((S1 ('MetaSel ('Just "expires_at") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe UTCTime)) :*: S1 ('MetaSel ('Just "id") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UUID)) :*: (S1 ('MetaSel ('Just "identity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Identity traits metadataAdmin metadataPublic)) :*: S1 ('MetaSel ('Just "issued_at") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe UTCTime)))))) |
data SettingsProfileFormConfig Source #
Constructors
SettingsProfileFormConfig | |
Instances
data SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic Source #
The Response for Login Flows via API
Constructors
SuccessfulSelfServiceLoginWithoutBrowser | |
Fields
|
Instances
(Eq metadataAdmin, Eq metadataPublic, Eq traits) => Eq (SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic) Source # | |
Defined in OryKratos.Types.Other Methods (==) :: SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic -> SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic -> Bool # (/=) :: SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic -> SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic -> Bool # | |
(Data traits, Data metadataAdmin, Data metadataPublic) => Data (SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic) Source # | |
Defined in OryKratos.Types.Other Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic -> c (SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic) # toConstr :: SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic -> Constr # dataTypeOf :: SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic)) # gmapT :: (forall b. Data b => b -> b) -> SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic -> SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic -> r # gmapQ :: (forall d. Data d => d -> u) -> SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic -> m (SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic -> m (SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic -> m (SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic) # | |
(Show metadataAdmin, Show metadataPublic, Show traits) => Show (SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic) Source # | |
Defined in OryKratos.Types.Other Methods showsPrec :: Int -> SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic -> ShowS # show :: SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic -> String # showList :: [SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic] -> ShowS # | |
Generic (SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic) Source # | |
Defined in OryKratos.Types.Other Associated Types type Rep (SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic) :: Type -> Type # Methods from :: SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic -> Rep (SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic) x # to :: Rep (SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic) x -> SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic # | |
(ToJSON traits, ToJSON metadataAdmin, ToJSON metadataPublic) => ToJSON (SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic) Source # | |
Defined in OryKratos.Types.Other Methods toJSON :: SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic -> Value # toEncoding :: SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic -> Encoding # toJSONList :: [SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic] -> Value # toEncodingList :: [SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic] -> Encoding # | |
(FromJSON traits, FromJSON metadataAdmin, FromJSON metadataPublic) => FromJSON (SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic) Source # | |
Defined in OryKratos.Types.Other Methods parseJSON :: Value -> Parser (SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic) # parseJSONList :: Value -> Parser [SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic] # | |
type Rep (SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic) Source # | |
Defined in OryKratos.Types.Other type Rep (SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic) = D1 ('MetaData "SuccessfulSelfServiceLoginWithoutBrowser" "OryKratos.Types.Other" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "SuccessfulSelfServiceLoginWithoutBrowser" 'PrefixI 'True) (S1 ('MetaSel ('Just "session") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Session traits metadataAdmin metadataPublic)) :*: S1 ('MetaSel ('Just "session_token") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)))) |
data SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic Source #
The Response for Registration Flows via API
Constructors
SuccessfulSelfServiceRegistrationWithoutBrowser | |
Fields
|
Instances
(Eq metadataAdmin, Eq metadataPublic, Eq traits) => Eq (SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic) Source # | |
Defined in OryKratos.Types.Other Methods (==) :: SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic -> SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic -> Bool # (/=) :: SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic -> SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic -> Bool # | |
(Data traits, Data metadataAdmin, Data metadataPublic) => Data (SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic) Source # | |
Defined in OryKratos.Types.Other Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic -> c (SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic) # toConstr :: SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic -> Constr # dataTypeOf :: SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic)) # gmapT :: (forall b. Data b => b -> b) -> SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic -> SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic -> r # gmapQ :: (forall d. Data d => d -> u) -> SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic -> m (SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic -> m (SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic -> m (SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic) # | |
(Show metadataAdmin, Show metadataPublic, Show traits) => Show (SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic) Source # | |
Defined in OryKratos.Types.Other Methods showsPrec :: Int -> SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic -> ShowS # show :: SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic -> String # showList :: [SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic] -> ShowS # | |
Generic (SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic) Source # | |
Defined in OryKratos.Types.Other Associated Types type Rep (SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic) :: Type -> Type # Methods from :: SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic -> Rep (SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic) x # to :: Rep (SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic) x -> SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic # | |
(ToJSON traits, ToJSON metadataAdmin, ToJSON metadataPublic) => ToJSON (SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic) Source # | |
Defined in OryKratos.Types.Other Methods toJSON :: SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic -> Value # toEncoding :: SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic -> Encoding # toJSONList :: [SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic] -> Value # toEncodingList :: [SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic] -> Encoding # | |
(FromJSON traits, FromJSON metadataAdmin, FromJSON metadataPublic) => FromJSON (SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic) Source # | |
Defined in OryKratos.Types.Other Methods parseJSON :: Value -> Parser (SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic) # parseJSONList :: Value -> Parser [SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic] # | |
type Rep (SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic) Source # | |
Defined in OryKratos.Types.Other type Rep (SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic) = D1 ('MetaData "SuccessfulSelfServiceRegistrationWithoutBrowser" "OryKratos.Types.Other" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "SuccessfulSelfServiceRegistrationWithoutBrowser" 'PrefixI 'True) (S1 ('MetaSel ('Just "identity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Identity traits metadataAdmin metadataPublic)) :*: (S1 ('MetaSel ('Just "session") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (Session traits metadataAdmin metadataPublic))) :*: S1 ('MetaSel ('Just "session_token") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text))))) |
data SubmitSelfServiceLoginFlowBody Source #
Constructors
SubmitSelfServiceLoginFlowBody | |
Fields
|
Instances
data SubmitSelfServiceLoginFlowWithLookupSecretMethodBody Source #
Constructors
SubmitSelfServiceLoginFlowWithLookupSecretMethodBody | |
Fields
|
Instances
data SubmitSelfServiceLoginFlowWithOidcMethodBody Source #
SubmitSelfServiceLoginFlowWithOidcMethodBody is used to decode the login form payload when using the oidc method.
Constructors
SubmitSelfServiceLoginFlowWithOidcMethodBody | |
Instances
data SubmitSelfServiceLoginFlowWithPasswordMethodBody Source #
Constructors
SubmitSelfServiceLoginFlowWithPasswordMethodBody | |
Fields
|
Instances
data SubmitSelfServiceLoginFlowWithTotpMethodBody Source #
Constructors
SubmitSelfServiceLoginFlowWithTotpMethodBody | |
Instances
data SubmitSelfServiceLoginFlowWithWebAuthnMethodBody Source #
Constructors
SubmitSelfServiceLoginFlowWithWebAuthnMethodBody | |
Fields
|
Instances
data SubmitSelfServiceLogoutFlowWithoutBrowserBody Source #
nolint:deadcode,unused
Constructors
SubmitSelfServiceLogoutFlowWithoutBrowserBody | |
Fields
|
Instances
data SubmitSelfServiceRecoveryFlowBody Source #
Constructors
SubmitSelfServiceRecoveryFlowBody | |
Fields
|
Instances
data SubmitSelfServiceRecoveryFlowWithLinkMethodBody Source #
Constructors
SubmitSelfServiceRecoveryFlowWithLinkMethodBody | |
Fields
|
Instances
data SubmitSelfServiceRegistrationFlowBody Source #
Constructors
SubmitSelfServiceRegistrationFlowBody | |
Fields
|
Instances
data SubmitSelfServiceRegistrationFlowWithOidcMethodBody Source #
SubmitSelfServiceRegistrationFlowWithOidcMethodBody is used to decode the registration form payload when using the oidc method.
Instances
data SubmitSelfServiceRegistrationFlowWithPasswordMethodBody Source #
SubmitSelfServiceRegistrationFlowWithPasswordMethodBody is used to decode the registration form payload when using the password method.
Constructors
SubmitSelfServiceRegistrationFlowWithPasswordMethodBody | |
Fields
|
Instances
data SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody Source #
Constructors
SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody | |
Fields
|
Instances
data SubmitSelfServiceSettingsFlowBody Source #
Constructors
SubmitSelfServiceSettingsFlowBody | |
Fields
|
Instances
data SubmitSelfServiceSettingsFlowWithLookupMethodBody Source #
Constructors
SubmitSelfServiceSettingsFlowWithLookupMethodBody | |
Fields
|
Instances
data SubmitSelfServiceSettingsFlowWithOidcMethodBody Source #
nolint:deadcode,unused
Constructors
SubmitSelfServiceSettingsFlowWithOidcMethodBody | |
Fields
|
Instances
data SubmitSelfServiceSettingsFlowWithPasswordMethodBody Source #
Instances
data SubmitSelfServiceSettingsFlowWithProfileMethodBody Source #
nolint:deadcode,unused
Instances
data SubmitSelfServiceSettingsFlowWithTotpMethodBody Source #
Constructors
SubmitSelfServiceSettingsFlowWithTotpMethodBody | |
Fields
|
Instances
data SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody Source #
Constructors
SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody | |
Fields
|
Instances
data SubmitSelfServiceVerificationFlowBody Source #
nolint:deadcode,unused
Constructors
SubmitSelfServiceVerificationFlowBody | |
Fields
|
Instances
data SubmitSelfServiceVerificationFlowWithLinkMethodBody Source #
Constructors
SubmitSelfServiceVerificationFlowWithLinkMethodBody | |
Fields
|
Instances
data SelfServiceBrowserLocationChangeRequiredError Source #
Constructors
SelfServiceBrowserLocationChangeRequiredError | |
Fields
|
Instances
data SelfServiceError Source #
Constructors
SelfServiceError | |
Instances
data SelfServiceFlowExpiredError Source #
Is sent when a flow is expired
Constructors
SelfServiceFlowExpiredError | |
Fields
|
Instances
data SelfServiceLoginFlow Source #
This object represents a login flow. A login flow is initiated at the "Initiate Login API / Browser Flow" endpoint by a client. Once a login flow is completed successfully, a session cookie or session token will be issued.
Constructors
SelfServiceLoginFlow | |
Fields
|
Instances
data SelfServiceLogoutUrl Source #
Constructors
SelfServiceLogoutUrl | |
Fields
|
Instances
data SelfServiceRecoveryFlow Source #
This request is used when an identity wants to recover their account. We recommend reading the Account Recovery Documentation
Constructors
SelfServiceRecoveryFlow | |
Fields
|
Instances
data SelfServiceRecoveryFlowState Source #
The state represents the state of the recovery flow. choose_method: ask the user to choose a method (e.g. recover account via email) sent_email: the email has been sent to the user passed_challenge: the request was successful and the recovery challenge was passed.
Constructors
SelfServiceRecoveryFlowStateChooseMethod | |
SelfServiceRecoveryFlowStateSentEmail | |
SelfServiceRecoveryFlowStatePassedChallenge |
Instances
data SelfServiceRecoveryLink Source #
Constructors
SelfServiceRecoveryLink | |
Fields
|
Instances
data SelfServiceRegistrationFlow Source #
Constructors
SelfServiceRegistrationFlow | |
Fields
|
Instances
data SelfServiceSettingsFlow traits metadataAdmin metadataPublic Source #
This flow is used when an identity wants to update settings (e.g. profile data, passwords, ...) in a selfservice manner. We recommend reading the User Settings Documentation
Constructors
SelfServiceSettingsFlow | |
Fields
|
Instances
(Eq metadataAdmin, Eq metadataPublic, Eq traits) => Eq (SelfServiceSettingsFlow traits metadataAdmin metadataPublic) Source # | |
Defined in OryKratos.Types.SelfService Methods (==) :: SelfServiceSettingsFlow traits metadataAdmin metadataPublic -> SelfServiceSettingsFlow traits metadataAdmin metadataPublic -> Bool # (/=) :: SelfServiceSettingsFlow traits metadataAdmin metadataPublic -> SelfServiceSettingsFlow traits metadataAdmin metadataPublic -> Bool # | |
(Data traits, Data metadataAdmin, Data metadataPublic) => Data (SelfServiceSettingsFlow traits metadataAdmin metadataPublic) Source # | |
Defined in OryKratos.Types.SelfService Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SelfServiceSettingsFlow traits metadataAdmin metadataPublic -> c (SelfServiceSettingsFlow traits metadataAdmin metadataPublic) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (SelfServiceSettingsFlow traits metadataAdmin metadataPublic) # toConstr :: SelfServiceSettingsFlow traits metadataAdmin metadataPublic -> Constr # dataTypeOf :: SelfServiceSettingsFlow traits metadataAdmin metadataPublic -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (SelfServiceSettingsFlow traits metadataAdmin metadataPublic)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (SelfServiceSettingsFlow traits metadataAdmin metadataPublic)) # gmapT :: (forall b. Data b => b -> b) -> SelfServiceSettingsFlow traits metadataAdmin metadataPublic -> SelfServiceSettingsFlow traits metadataAdmin metadataPublic # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SelfServiceSettingsFlow traits metadataAdmin metadataPublic -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SelfServiceSettingsFlow traits metadataAdmin metadataPublic -> r # gmapQ :: (forall d. Data d => d -> u) -> SelfServiceSettingsFlow traits metadataAdmin metadataPublic -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> SelfServiceSettingsFlow traits metadataAdmin metadataPublic -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> SelfServiceSettingsFlow traits metadataAdmin metadataPublic -> m (SelfServiceSettingsFlow traits metadataAdmin metadataPublic) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SelfServiceSettingsFlow traits metadataAdmin metadataPublic -> m (SelfServiceSettingsFlow traits metadataAdmin metadataPublic) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SelfServiceSettingsFlow traits metadataAdmin metadataPublic -> m (SelfServiceSettingsFlow traits metadataAdmin metadataPublic) # | |
(Show metadataAdmin, Show metadataPublic, Show traits) => Show (SelfServiceSettingsFlow traits metadataAdmin metadataPublic) Source # | |
Defined in OryKratos.Types.SelfService Methods showsPrec :: Int -> SelfServiceSettingsFlow traits metadataAdmin metadataPublic -> ShowS # show :: SelfServiceSettingsFlow traits metadataAdmin metadataPublic -> String # showList :: [SelfServiceSettingsFlow traits metadataAdmin metadataPublic] -> ShowS # | |
Generic (SelfServiceSettingsFlow traits metadataAdmin metadataPublic) Source # | |
Defined in OryKratos.Types.SelfService Associated Types type Rep (SelfServiceSettingsFlow traits metadataAdmin metadataPublic) :: Type -> Type # Methods from :: SelfServiceSettingsFlow traits metadataAdmin metadataPublic -> Rep (SelfServiceSettingsFlow traits metadataAdmin metadataPublic) x # to :: Rep (SelfServiceSettingsFlow traits metadataAdmin metadataPublic) x -> SelfServiceSettingsFlow traits metadataAdmin metadataPublic # | |
(ToJSON traits, ToJSON metadataAdmin, ToJSON metadataPublic) => ToJSON (SelfServiceSettingsFlow traits metadataAdmin metadataPublic) Source # | |
Defined in OryKratos.Types.SelfService Methods toJSON :: SelfServiceSettingsFlow traits metadataAdmin metadataPublic -> Value # toEncoding :: SelfServiceSettingsFlow traits metadataAdmin metadataPublic -> Encoding # toJSONList :: [SelfServiceSettingsFlow traits metadataAdmin metadataPublic] -> Value # toEncodingList :: [SelfServiceSettingsFlow traits metadataAdmin metadataPublic] -> Encoding # | |
(FromJSON traits, FromJSON metadataAdmin, FromJSON metadataPublic) => FromJSON (SelfServiceSettingsFlow traits metadataAdmin metadataPublic) Source # | |
Defined in OryKratos.Types.SelfService Methods parseJSON :: Value -> Parser (SelfServiceSettingsFlow traits metadataAdmin metadataPublic) # parseJSONList :: Value -> Parser [SelfServiceSettingsFlow traits metadataAdmin metadataPublic] # | |
type Rep (SelfServiceSettingsFlow traits metadataAdmin metadataPublic) Source # | |
Defined in OryKratos.Types.SelfService type Rep (SelfServiceSettingsFlow traits metadataAdmin metadataPublic) = D1 ('MetaData "SelfServiceSettingsFlow" "OryKratos.Types.SelfService" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "SelfServiceSettingsFlow" 'PrefixI 'True) (((S1 ('MetaSel ('Just "active") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "expires_at") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UTCTime)) :*: (S1 ('MetaSel ('Just "id") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UUID) :*: (S1 ('MetaSel ('Just "identity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Identity traits metadataAdmin metadataPublic)) :*: S1 ('MetaSel ('Just "issued_at") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UTCTime)))) :*: ((S1 ('MetaSel ('Just "request_url") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "return_to") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text))) :*: (S1 ('MetaSel ('Just "state") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SelfServiceSettingsFlowState) :*: (S1 ('MetaSel ('Just "_type") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "ui") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UiContainer)))))) |
data SelfServiceSettingsFlowState Source #
show_form: No user data has been collected, or it is invalid, and thus the form should be shown. success: Indicates that the settings flow has been updated successfully with the provided data. Done will stay true when repeatedly checking. If set to true, done will revert back to false only when a flow with invalid (e.g. "please use a valid phone number") data was sent.
Instances
data SelfServiceVerificationFlow Source #
Used to verify an out-of-band communication channel such as an email address or a phone number. For more information head over to: https://www.ory.sh/docs/kratos/selfservice/flows/verify-email-account-activation
Constructors
SelfServiceVerificationFlow | |
Fields
|
Instances
data SelfServiceVerificationFlowState Source #
The state represents the state of the verification flow. choose_method: ask the user to choose a method (e.g. recover account via email) sent_email: the email has been sent to the user passed_challenge: the request was successful and the recovery challenge was passed.
Constructors
SelfServiceVerificationFlowStateChooseMethod | |
SelfServiceVerificationFlowStateSentEmail | |
SelfServiceVerificationFlowStatePassedChallenge |
Instances
data AuthenticatorAssuranceLevel Source #
The authenticator assurance level can be one of "aal1", "aal2", or "aal3". A higher number means that it is harder for an attacker to compromise the account. Generally, "aal1" implies that one authentication factor was used while AAL2 implies that two factors (e.g. password + TOTP) have been used. To learn more about these levels please head over to: https://www.ory.sh/kratos/docs/concepts/credentials
Constructors
AuthenticatorAssuranceLevel0 | |
AuthenticatorAssuranceLevel1 | |
AuthenticatorAssuranceLevel2 | |
AuthenticatorAssuranceLevel3 |
Instances
data ErrorAuthenticatorAssuranceLevelNotSatisfied Source #
Constructors
ErrorAuthenticatorAssuranceLevelNotSatisfied | |
Fields
|
Instances
data GenericError Source #
Constructors
GenericError | |
Fields
|
Instances
data GetVersion200Response Source #
Constructors
GetVersion200Response | |
Fields
|
Instances
data HealthNotReadyStatus Source #
Constructors
HealthNotReadyStatus | |
Fields
|
Instances
data HealthStatus Source #
Constructors
HealthStatus | |
Fields
|
Instances
data IsAlive200Response Source #
Constructors
IsAlive200Response | |
Fields
|
Instances
data IsReady503Response Source #
Constructors
IsReady503Response | |
Fields
|
Instances
The standard Ory JSON API error format.
Constructors
JsonError | |
Fields |
Instances
Eq JsonError Source # | |
Data JsonError Source # | |
Defined in OryKratos.Types.Types Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> JsonError -> c JsonError # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c JsonError # toConstr :: JsonError -> Constr # dataTypeOf :: JsonError -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c JsonError) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c JsonError) # gmapT :: (forall b. Data b => b -> b) -> JsonError -> JsonError # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> JsonError -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> JsonError -> r # gmapQ :: (forall d. Data d => d -> u) -> JsonError -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> JsonError -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> JsonError -> m JsonError # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> JsonError -> m JsonError # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> JsonError -> m JsonError # | |
Show JsonError Source # | |
Generic JsonError Source # | |
ToJSON JsonError Source # | |
Defined in OryKratos.Types.Types | |
FromJSON JsonError Source # | |
type Rep JsonError Source # | |
Defined in OryKratos.Types.Types type Rep JsonError = D1 ('MetaData "JsonError" "OryKratos.Types.Types" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "JsonError" 'PrefixI 'True) (S1 ('MetaSel ('Just "jsonErrorError") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 GenericError))) |
data NeedsPrivilegedSessionError Source #
Constructors
NeedsPrivilegedSessionError | |
Fields
|
Instances
data Pagination Source #
Constructors
Pagination | |
Instances
data RecoveryAddress Source #
Constructors
RecoveryAddress | |
Instances
data RevokedSessions Source #
Constructors
RevokedSessions | |
Instances
data SessionAuthenticationMethod Source #
A singular authenticator used during authentication / login.
Constructors
SessionAuthenticationMethod | |
Fields
|
Instances
data SessionDevice Source #
Constructors
SessionDevice | |
Fields
|
Instances
data SubmitSelfServiceFlowWithWebAuthnRegistrationMethod Source #
Constructors
SubmitSelfServiceFlowWithWebAuthnRegistrationMethod | |
Fields
|
Instances
data VerifiableIdentityAddress Source #
VerifiableAddress is an identity's verifiable address
Constructors
VerifiableIdentityAddress | |
Fields
|
Instances
Instances
Eq Version Source # | |
Data Version Source # | |
Defined in OryKratos.Types.Types Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Version -> c Version # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Version # toConstr :: Version -> Constr # dataTypeOf :: Version -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Version) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Version) # gmapT :: (forall b. Data b => b -> b) -> Version -> Version # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Version -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Version -> r # gmapQ :: (forall d. Data d => d -> u) -> Version -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Version -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Version -> m Version # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Version -> m Version # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Version -> m Version # | |
Show Version Source # | |
Generic Version Source # | |
ToJSON Version Source # | |
Defined in OryKratos.Types.Types | |
FromJSON Version Source # | |
type Rep Version Source # | |
Defined in OryKratos.Types.Types |
data UiContainer Source #
Container represents a HTML Form. The container can work with both HTTP Form and JSON requests
Constructors
UiContainer | |
Instances
Nodes are represented as HTML elements or their native UI equivalents. For example, a node can be an `<img>` tag, or an `<input element>` but also `some plain text`.
Constructors
UiNode | |
Fields
|
Instances
Eq UiNode Source # | |
Data UiNode Source # | |
Defined in OryKratos.Types.Ui Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UiNode -> c UiNode # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UiNode # toConstr :: UiNode -> Constr # dataTypeOf :: UiNode -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UiNode) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UiNode) # gmapT :: (forall b. Data b => b -> b) -> UiNode -> UiNode # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UiNode -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UiNode -> r # gmapQ :: (forall d. Data d => d -> u) -> UiNode -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> UiNode -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> UiNode -> m UiNode # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UiNode -> m UiNode # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UiNode -> m UiNode # | |
Show UiNode Source # | |
Generic UiNode Source # | |
ToJSON UiNode Source # | |
Defined in OryKratos.Types.Ui | |
FromJSON UiNode Source # | |
type Rep UiNode Source # | |
Defined in OryKratos.Types.Ui type Rep UiNode = D1 ('MetaData "UiNode" "OryKratos.Types.Ui" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "UiNode" 'PrefixI 'True) ((S1 ('MetaSel ('Just "attributes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UiNodeAttributes) :*: S1 ('MetaSel ('Just "group") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)) :*: (S1 ('MetaSel ('Just "messages") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [UiText]) :*: (S1 ('MetaSel ('Just "meta") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UiNodeMeta) :*: S1 ('MetaSel ('Just "_type") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text))))) |
data UiNodeAnchorAttributes Source #
Constructors
UiNodeAnchorAttributes | |
Fields |
Instances
data UiNodeAttributes Source #
Constructors
UiNodeAttributes | |
Fields
|
Instances
data UiNodeImageAttributes Source #
Constructors
UiNodeImageAttributes | |
Fields
|
Instances
data UiNodeInputAttributes Source #
InputAttributes represents the attributes of an input node
Constructors
UiNodeInputAttributes | |
Fields
|
Instances
data UiNodeMeta Source #
This might include a label and other information that can optionally be used to render UIs.
Constructors
UiNodeMeta | |
Instances
Eq UiNodeMeta Source # | |
Defined in OryKratos.Types.Ui | |
Data UiNodeMeta Source # | |
Defined in OryKratos.Types.Ui Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UiNodeMeta -> c UiNodeMeta # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UiNodeMeta # toConstr :: UiNodeMeta -> Constr # dataTypeOf :: UiNodeMeta -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UiNodeMeta) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UiNodeMeta) # gmapT :: (forall b. Data b => b -> b) -> UiNodeMeta -> UiNodeMeta # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UiNodeMeta -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UiNodeMeta -> r # gmapQ :: (forall d. Data d => d -> u) -> UiNodeMeta -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> UiNodeMeta -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> UiNodeMeta -> m UiNodeMeta # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UiNodeMeta -> m UiNodeMeta # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UiNodeMeta -> m UiNodeMeta # | |
Show UiNodeMeta Source # | |
Defined in OryKratos.Types.Ui Methods showsPrec :: Int -> UiNodeMeta -> ShowS # show :: UiNodeMeta -> String # showList :: [UiNodeMeta] -> ShowS # | |
Generic UiNodeMeta Source # | |
Defined in OryKratos.Types.Ui Associated Types type Rep UiNodeMeta :: Type -> Type # | |
ToJSON UiNodeMeta Source # | |
Defined in OryKratos.Types.Ui Methods toJSON :: UiNodeMeta -> Value # toEncoding :: UiNodeMeta -> Encoding # toJSONList :: [UiNodeMeta] -> Value # toEncodingList :: [UiNodeMeta] -> Encoding # | |
FromJSON UiNodeMeta Source # | |
Defined in OryKratos.Types.Ui | |
type Rep UiNodeMeta Source # | |
Defined in OryKratos.Types.Ui type Rep UiNodeMeta = D1 ('MetaData "UiNodeMeta" "OryKratos.Types.Ui" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "UiNodeMeta" 'PrefixI 'True) (S1 ('MetaSel ('Just "label") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe UiText)))) |
data UiNodeScriptAttributes Source #
Constructors
UiNodeScriptAttributes | |
Fields
|
Instances
data UiNodeTextAttributes Source #
Constructors
UiNodeTextAttributes | |
Instances
Constructors
UiText | |
Instances
Eq UiText Source # | |
Data UiText Source # | |
Defined in OryKratos.Types.Ui Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UiText -> c UiText # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UiText # toConstr :: UiText -> Constr # dataTypeOf :: UiText -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UiText) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UiText) # gmapT :: (forall b. Data b => b -> b) -> UiText -> UiText # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UiText -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UiText -> r # gmapQ :: (forall d. Data d => d -> u) -> UiText -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> UiText -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> UiText -> m UiText # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UiText -> m UiText # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UiText -> m UiText # | |
Show UiText Source # | |
Generic UiText Source # | |
ToJSON UiText Source # | |
Defined in OryKratos.Types.Ui | |
FromJSON UiText Source # | |
type Rep UiText Source # | |
Defined in OryKratos.Types.Ui type Rep UiText = D1 ('MetaData "UiText" "OryKratos.Types.Ui" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "UiText" 'PrefixI 'True) ((S1 ('MetaSel ('Just "context") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Value)) :*: S1 ('MetaSel ('Just "id") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Integer)) :*: (S1 ('MetaSel ('Just "text") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "_type") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))) |