ory-kratos-0.0.10.0: API bindings for Ory Kratos
Safe HaskellNone
LanguageHaskell2010

OryKratos.Types

Synopsis

Documentation

data AdminCreateIdentityBody Source #

Constructors

AdminCreateIdentityBody 

Fields

  • credentials :: Maybe AdminIdentityImportCredentials
     
  • metadata_admin :: Maybe Value

    Store metadata about the user which is only accessible through admin APIs such as `GET adminidentities/id`.

  • metadata_public :: Maybe Value

    Store metadata about the identity which the identity itself can see when calling for example the session endpoint. Do not store sensitive information (e.g. credit score) about the identity in this field.

  • recovery_addresses :: Maybe [RecoveryAddress]

    RecoveryAddresses contains all the addresses that can be used to recover an identity. Use this structure to import recovery addresses for an identity. Please keep in mind that the address needs to be represented in the Identity Schema or this field will be overwritten on the next identity update.

  • schema_id :: Text

    SchemaID is the ID of the JSON Schema to be used for validating the identity's traits.

  • state :: Maybe IdentityState
     
  • traits :: Value

    Traits represent an identity's traits. The identity is able to create, modify, and delete traits in a self-service manner. The input will always be validated against the JSON Schema defined in schema_url.

  • verifiable_addresses :: Maybe [VerifiableIdentityAddress]

    VerifiableAddresses contains all the addresses that can be verified by the user. Use this structure to import verified addresses for an identity. Please keep in mind that the address needs to be represented in the Identity Schema or this field will be overwritten on the next identity update.

Instances

Instances details
Eq AdminCreateIdentityBody Source # 
Instance details

Defined in OryKratos.Types.Admin

Data AdminCreateIdentityBody Source # 
Instance details

Defined in OryKratos.Types.Admin

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AdminCreateIdentityBody -> c AdminCreateIdentityBody #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AdminCreateIdentityBody #

toConstr :: AdminCreateIdentityBody -> Constr #

dataTypeOf :: AdminCreateIdentityBody -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AdminCreateIdentityBody) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AdminCreateIdentityBody) #

gmapT :: (forall b. Data b => b -> b) -> AdminCreateIdentityBody -> AdminCreateIdentityBody #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AdminCreateIdentityBody -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AdminCreateIdentityBody -> r #

gmapQ :: (forall d. Data d => d -> u) -> AdminCreateIdentityBody -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AdminCreateIdentityBody -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AdminCreateIdentityBody -> m AdminCreateIdentityBody #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AdminCreateIdentityBody -> m AdminCreateIdentityBody #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AdminCreateIdentityBody -> m AdminCreateIdentityBody #

Show AdminCreateIdentityBody Source # 
Instance details

Defined in OryKratos.Types.Admin

Generic AdminCreateIdentityBody Source # 
Instance details

Defined in OryKratos.Types.Admin

Associated Types

type Rep AdminCreateIdentityBody :: Type -> Type #

ToJSON AdminCreateIdentityBody Source # 
Instance details

Defined in OryKratos.Types.Admin

FromJSON AdminCreateIdentityBody Source # 
Instance details

Defined in OryKratos.Types.Admin

type Rep AdminCreateIdentityBody Source # 
Instance details

Defined in OryKratos.Types.Admin

data AdminCreateIdentityImportCredentialsOidc Source #

Instances

Instances details
Eq AdminCreateIdentityImportCredentialsOidc Source # 
Instance details

Defined in OryKratos.Types.Admin

Data AdminCreateIdentityImportCredentialsOidc Source # 
Instance details

Defined in OryKratos.Types.Admin

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AdminCreateIdentityImportCredentialsOidc -> c AdminCreateIdentityImportCredentialsOidc #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AdminCreateIdentityImportCredentialsOidc #

toConstr :: AdminCreateIdentityImportCredentialsOidc -> Constr #

dataTypeOf :: AdminCreateIdentityImportCredentialsOidc -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AdminCreateIdentityImportCredentialsOidc) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AdminCreateIdentityImportCredentialsOidc) #

gmapT :: (forall b. Data b => b -> b) -> AdminCreateIdentityImportCredentialsOidc -> AdminCreateIdentityImportCredentialsOidc #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AdminCreateIdentityImportCredentialsOidc -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AdminCreateIdentityImportCredentialsOidc -> r #

gmapQ :: (forall d. Data d => d -> u) -> AdminCreateIdentityImportCredentialsOidc -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AdminCreateIdentityImportCredentialsOidc -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AdminCreateIdentityImportCredentialsOidc -> m AdminCreateIdentityImportCredentialsOidc #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AdminCreateIdentityImportCredentialsOidc -> m AdminCreateIdentityImportCredentialsOidc #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AdminCreateIdentityImportCredentialsOidc -> m AdminCreateIdentityImportCredentialsOidc #

Show AdminCreateIdentityImportCredentialsOidc Source # 
Instance details

Defined in OryKratos.Types.Admin

Generic AdminCreateIdentityImportCredentialsOidc Source # 
Instance details

Defined in OryKratos.Types.Admin

ToJSON AdminCreateIdentityImportCredentialsOidc Source # 
Instance details

Defined in OryKratos.Types.Admin

FromJSON AdminCreateIdentityImportCredentialsOidc Source # 
Instance details

Defined in OryKratos.Types.Admin

type Rep AdminCreateIdentityImportCredentialsOidc Source # 
Instance details

Defined in OryKratos.Types.Admin

type Rep AdminCreateIdentityImportCredentialsOidc = D1 ('MetaData "AdminCreateIdentityImportCredentialsOidc" "OryKratos.Types.Admin" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "AdminCreateIdentityImportCredentialsOidc" 'PrefixI 'True) (S1 ('MetaSel ('Just "config") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe AdminCreateIdentityImportCredentialsOidcConfig))))

data AdminCreateIdentityImportCredentialsOidcConfig Source #

Instances

Instances details
Eq AdminCreateIdentityImportCredentialsOidcConfig Source # 
Instance details

Defined in OryKratos.Types.Admin

Data AdminCreateIdentityImportCredentialsOidcConfig Source # 
Instance details

Defined in OryKratos.Types.Admin

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AdminCreateIdentityImportCredentialsOidcConfig -> c AdminCreateIdentityImportCredentialsOidcConfig #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AdminCreateIdentityImportCredentialsOidcConfig #

toConstr :: AdminCreateIdentityImportCredentialsOidcConfig -> Constr #

dataTypeOf :: AdminCreateIdentityImportCredentialsOidcConfig -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AdminCreateIdentityImportCredentialsOidcConfig) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AdminCreateIdentityImportCredentialsOidcConfig) #

gmapT :: (forall b. Data b => b -> b) -> AdminCreateIdentityImportCredentialsOidcConfig -> AdminCreateIdentityImportCredentialsOidcConfig #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AdminCreateIdentityImportCredentialsOidcConfig -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AdminCreateIdentityImportCredentialsOidcConfig -> r #

gmapQ :: (forall d. Data d => d -> u) -> AdminCreateIdentityImportCredentialsOidcConfig -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AdminCreateIdentityImportCredentialsOidcConfig -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AdminCreateIdentityImportCredentialsOidcConfig -> m AdminCreateIdentityImportCredentialsOidcConfig #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AdminCreateIdentityImportCredentialsOidcConfig -> m AdminCreateIdentityImportCredentialsOidcConfig #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AdminCreateIdentityImportCredentialsOidcConfig -> m AdminCreateIdentityImportCredentialsOidcConfig #

Show AdminCreateIdentityImportCredentialsOidcConfig Source # 
Instance details

Defined in OryKratos.Types.Admin

Generic AdminCreateIdentityImportCredentialsOidcConfig Source # 
Instance details

Defined in OryKratos.Types.Admin

ToJSON AdminCreateIdentityImportCredentialsOidcConfig Source # 
Instance details

Defined in OryKratos.Types.Admin

FromJSON AdminCreateIdentityImportCredentialsOidcConfig Source # 
Instance details

Defined in OryKratos.Types.Admin

type Rep AdminCreateIdentityImportCredentialsOidcConfig Source # 
Instance details

Defined in OryKratos.Types.Admin

type Rep AdminCreateIdentityImportCredentialsOidcConfig = D1 ('MetaData "AdminCreateIdentityImportCredentialsOidcConfig" "OryKratos.Types.Admin" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "AdminCreateIdentityImportCredentialsOidcConfig" 'PrefixI 'True) (S1 ('MetaSel ('Just "config") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe AdminCreateIdentityImportCredentialsPasswordConfig)) :*: S1 ('MetaSel ('Just "providers") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe [AdminCreateIdentityImportCredentialsOidcProvider]))))

data AdminCreateIdentityImportCredentialsOidcProvider Source #

Constructors

AdminCreateIdentityImportCredentialsOidcProvider 

Fields

  • provider :: Text

    The OpenID Connect provider to link the subject to. Usually something like google or github.

  • subject :: Text

    The subject (sub) of the OpenID Connect connection. Usually the sub field of the ID Token.

Instances

Instances details
Eq AdminCreateIdentityImportCredentialsOidcProvider Source # 
Instance details

Defined in OryKratos.Types.Admin

Data AdminCreateIdentityImportCredentialsOidcProvider Source # 
Instance details

Defined in OryKratos.Types.Admin

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AdminCreateIdentityImportCredentialsOidcProvider -> c AdminCreateIdentityImportCredentialsOidcProvider #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AdminCreateIdentityImportCredentialsOidcProvider #

toConstr :: AdminCreateIdentityImportCredentialsOidcProvider -> Constr #

dataTypeOf :: AdminCreateIdentityImportCredentialsOidcProvider -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AdminCreateIdentityImportCredentialsOidcProvider) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AdminCreateIdentityImportCredentialsOidcProvider) #

gmapT :: (forall b. Data b => b -> b) -> AdminCreateIdentityImportCredentialsOidcProvider -> AdminCreateIdentityImportCredentialsOidcProvider #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AdminCreateIdentityImportCredentialsOidcProvider -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AdminCreateIdentityImportCredentialsOidcProvider -> r #

gmapQ :: (forall d. Data d => d -> u) -> AdminCreateIdentityImportCredentialsOidcProvider -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AdminCreateIdentityImportCredentialsOidcProvider -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AdminCreateIdentityImportCredentialsOidcProvider -> m AdminCreateIdentityImportCredentialsOidcProvider #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AdminCreateIdentityImportCredentialsOidcProvider -> m AdminCreateIdentityImportCredentialsOidcProvider #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AdminCreateIdentityImportCredentialsOidcProvider -> m AdminCreateIdentityImportCredentialsOidcProvider #

Show AdminCreateIdentityImportCredentialsOidcProvider Source # 
Instance details

Defined in OryKratos.Types.Admin

Generic AdminCreateIdentityImportCredentialsOidcProvider Source # 
Instance details

Defined in OryKratos.Types.Admin

ToJSON AdminCreateIdentityImportCredentialsOidcProvider Source # 
Instance details

Defined in OryKratos.Types.Admin

FromJSON AdminCreateIdentityImportCredentialsOidcProvider Source # 
Instance details

Defined in OryKratos.Types.Admin

type Rep AdminCreateIdentityImportCredentialsOidcProvider Source # 
Instance details

Defined in OryKratos.Types.Admin

type Rep AdminCreateIdentityImportCredentialsOidcProvider = D1 ('MetaData "AdminCreateIdentityImportCredentialsOidcProvider" "OryKratos.Types.Admin" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "AdminCreateIdentityImportCredentialsOidcProvider" 'PrefixI 'True) (S1 ('MetaSel ('Just "provider") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "subject") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

data AdminCreateIdentityImportCredentialsPassword Source #

Instances

Instances details
Eq AdminCreateIdentityImportCredentialsPassword Source # 
Instance details

Defined in OryKratos.Types.Admin

Data AdminCreateIdentityImportCredentialsPassword Source # 
Instance details

Defined in OryKratos.Types.Admin

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AdminCreateIdentityImportCredentialsPassword -> c AdminCreateIdentityImportCredentialsPassword #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AdminCreateIdentityImportCredentialsPassword #

toConstr :: AdminCreateIdentityImportCredentialsPassword -> Constr #

dataTypeOf :: AdminCreateIdentityImportCredentialsPassword -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AdminCreateIdentityImportCredentialsPassword) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AdminCreateIdentityImportCredentialsPassword) #

gmapT :: (forall b. Data b => b -> b) -> AdminCreateIdentityImportCredentialsPassword -> AdminCreateIdentityImportCredentialsPassword #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AdminCreateIdentityImportCredentialsPassword -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AdminCreateIdentityImportCredentialsPassword -> r #

gmapQ :: (forall d. Data d => d -> u) -> AdminCreateIdentityImportCredentialsPassword -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AdminCreateIdentityImportCredentialsPassword -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AdminCreateIdentityImportCredentialsPassword -> m AdminCreateIdentityImportCredentialsPassword #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AdminCreateIdentityImportCredentialsPassword -> m AdminCreateIdentityImportCredentialsPassword #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AdminCreateIdentityImportCredentialsPassword -> m AdminCreateIdentityImportCredentialsPassword #

Show AdminCreateIdentityImportCredentialsPassword Source # 
Instance details

Defined in OryKratos.Types.Admin

Generic AdminCreateIdentityImportCredentialsPassword Source # 
Instance details

Defined in OryKratos.Types.Admin

ToJSON AdminCreateIdentityImportCredentialsPassword Source # 
Instance details

Defined in OryKratos.Types.Admin

FromJSON AdminCreateIdentityImportCredentialsPassword Source # 
Instance details

Defined in OryKratos.Types.Admin

type Rep AdminCreateIdentityImportCredentialsPassword Source # 
Instance details

Defined in OryKratos.Types.Admin

type Rep AdminCreateIdentityImportCredentialsPassword = D1 ('MetaData "AdminCreateIdentityImportCredentialsPassword" "OryKratos.Types.Admin" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "AdminCreateIdentityImportCredentialsPassword" 'PrefixI 'True) (S1 ('MetaSel ('Just "config") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe AdminCreateIdentityImportCredentialsPasswordConfig))))

data AdminCreateIdentityImportCredentialsPasswordConfig Source #

Instances

Instances details
Eq AdminCreateIdentityImportCredentialsPasswordConfig Source # 
Instance details

Defined in OryKratos.Types.Admin

Data AdminCreateIdentityImportCredentialsPasswordConfig Source # 
Instance details

Defined in OryKratos.Types.Admin

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AdminCreateIdentityImportCredentialsPasswordConfig -> c AdminCreateIdentityImportCredentialsPasswordConfig #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AdminCreateIdentityImportCredentialsPasswordConfig #

toConstr :: AdminCreateIdentityImportCredentialsPasswordConfig -> Constr #

dataTypeOf :: AdminCreateIdentityImportCredentialsPasswordConfig -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AdminCreateIdentityImportCredentialsPasswordConfig) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AdminCreateIdentityImportCredentialsPasswordConfig) #

gmapT :: (forall b. Data b => b -> b) -> AdminCreateIdentityImportCredentialsPasswordConfig -> AdminCreateIdentityImportCredentialsPasswordConfig #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AdminCreateIdentityImportCredentialsPasswordConfig -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AdminCreateIdentityImportCredentialsPasswordConfig -> r #

gmapQ :: (forall d. Data d => d -> u) -> AdminCreateIdentityImportCredentialsPasswordConfig -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AdminCreateIdentityImportCredentialsPasswordConfig -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AdminCreateIdentityImportCredentialsPasswordConfig -> m AdminCreateIdentityImportCredentialsPasswordConfig #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AdminCreateIdentityImportCredentialsPasswordConfig -> m AdminCreateIdentityImportCredentialsPasswordConfig #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AdminCreateIdentityImportCredentialsPasswordConfig -> m AdminCreateIdentityImportCredentialsPasswordConfig #

Show AdminCreateIdentityImportCredentialsPasswordConfig Source # 
Instance details

Defined in OryKratos.Types.Admin

Generic AdminCreateIdentityImportCredentialsPasswordConfig Source # 
Instance details

Defined in OryKratos.Types.Admin

ToJSON AdminCreateIdentityImportCredentialsPasswordConfig Source # 
Instance details

Defined in OryKratos.Types.Admin

FromJSON AdminCreateIdentityImportCredentialsPasswordConfig Source # 
Instance details

Defined in OryKratos.Types.Admin

type Rep AdminCreateIdentityImportCredentialsPasswordConfig Source # 
Instance details

Defined in OryKratos.Types.Admin

type Rep AdminCreateIdentityImportCredentialsPasswordConfig = D1 ('MetaData "AdminCreateIdentityImportCredentialsPasswordConfig" "OryKratos.Types.Admin" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "AdminCreateIdentityImportCredentialsPasswordConfig" 'PrefixI 'True) (S1 ('MetaSel ('Just "hashed_password") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "password") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text))))

data AdminCreateSelfServiceRecoveryLinkBody Source #

Constructors

AdminCreateSelfServiceRecoveryLinkBody 

Fields

  • expires_in :: Maybe Text

    Link Expires In The recovery link will expire at that point in time. Defaults to the configuration value of `selfservice.flows.recovery.request_lifespan`.

  • identity_id :: Text
     

Instances

Instances details
Eq AdminCreateSelfServiceRecoveryLinkBody Source # 
Instance details

Defined in OryKratos.Types.Admin

Data AdminCreateSelfServiceRecoveryLinkBody Source # 
Instance details

Defined in OryKratos.Types.Admin

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AdminCreateSelfServiceRecoveryLinkBody -> c AdminCreateSelfServiceRecoveryLinkBody #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AdminCreateSelfServiceRecoveryLinkBody #

toConstr :: AdminCreateSelfServiceRecoveryLinkBody -> Constr #

dataTypeOf :: AdminCreateSelfServiceRecoveryLinkBody -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AdminCreateSelfServiceRecoveryLinkBody) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AdminCreateSelfServiceRecoveryLinkBody) #

gmapT :: (forall b. Data b => b -> b) -> AdminCreateSelfServiceRecoveryLinkBody -> AdminCreateSelfServiceRecoveryLinkBody #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AdminCreateSelfServiceRecoveryLinkBody -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AdminCreateSelfServiceRecoveryLinkBody -> r #

gmapQ :: (forall d. Data d => d -> u) -> AdminCreateSelfServiceRecoveryLinkBody -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AdminCreateSelfServiceRecoveryLinkBody -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AdminCreateSelfServiceRecoveryLinkBody -> m AdminCreateSelfServiceRecoveryLinkBody #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AdminCreateSelfServiceRecoveryLinkBody -> m AdminCreateSelfServiceRecoveryLinkBody #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AdminCreateSelfServiceRecoveryLinkBody -> m AdminCreateSelfServiceRecoveryLinkBody #

Show AdminCreateSelfServiceRecoveryLinkBody Source # 
Instance details

Defined in OryKratos.Types.Admin

Generic AdminCreateSelfServiceRecoveryLinkBody Source # 
Instance details

Defined in OryKratos.Types.Admin

ToJSON AdminCreateSelfServiceRecoveryLinkBody Source # 
Instance details

Defined in OryKratos.Types.Admin

FromJSON AdminCreateSelfServiceRecoveryLinkBody Source # 
Instance details

Defined in OryKratos.Types.Admin

type Rep AdminCreateSelfServiceRecoveryLinkBody Source # 
Instance details

Defined in OryKratos.Types.Admin

type Rep AdminCreateSelfServiceRecoveryLinkBody = D1 ('MetaData "AdminCreateSelfServiceRecoveryLinkBody" "OryKratos.Types.Admin" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "AdminCreateSelfServiceRecoveryLinkBody" 'PrefixI 'True) (S1 ('MetaSel ('Just "expires_in") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "identity_id") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

data AdminIdentityImportCredentials Source #

Instances

Instances details
Eq AdminIdentityImportCredentials Source # 
Instance details

Defined in OryKratos.Types.Admin

Data AdminIdentityImportCredentials Source # 
Instance details

Defined in OryKratos.Types.Admin

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AdminIdentityImportCredentials -> c AdminIdentityImportCredentials #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AdminIdentityImportCredentials #

toConstr :: AdminIdentityImportCredentials -> Constr #

dataTypeOf :: AdminIdentityImportCredentials -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AdminIdentityImportCredentials) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AdminIdentityImportCredentials) #

gmapT :: (forall b. Data b => b -> b) -> AdminIdentityImportCredentials -> AdminIdentityImportCredentials #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AdminIdentityImportCredentials -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AdminIdentityImportCredentials -> r #

gmapQ :: (forall d. Data d => d -> u) -> AdminIdentityImportCredentials -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AdminIdentityImportCredentials -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AdminIdentityImportCredentials -> m AdminIdentityImportCredentials #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AdminIdentityImportCredentials -> m AdminIdentityImportCredentials #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AdminIdentityImportCredentials -> m AdminIdentityImportCredentials #

Show AdminIdentityImportCredentials Source # 
Instance details

Defined in OryKratos.Types.Admin

Generic AdminIdentityImportCredentials Source # 
Instance details

Defined in OryKratos.Types.Admin

Associated Types

type Rep AdminIdentityImportCredentials :: Type -> Type #

ToJSON AdminIdentityImportCredentials Source # 
Instance details

Defined in OryKratos.Types.Admin

FromJSON AdminIdentityImportCredentials Source # 
Instance details

Defined in OryKratos.Types.Admin

type Rep AdminIdentityImportCredentials Source # 
Instance details

Defined in OryKratos.Types.Admin

type Rep AdminIdentityImportCredentials = D1 ('MetaData "AdminIdentityImportCredentials" "OryKratos.Types.Admin" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "AdminIdentityImportCredentials" 'PrefixI 'True) (S1 ('MetaSel ('Just "oidc") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe AdminCreateIdentityImportCredentialsOidc)) :*: S1 ('MetaSel ('Just "password") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe AdminCreateIdentityImportCredentialsPassword))))

data AdminUpdateIdentityBody Source #

Constructors

AdminUpdateIdentityBody 

Fields

  • metadata_admin :: Maybe Value

    Store metadata about the user which is only accessible through admin APIs such as `GET adminidentities/id`.

  • metadata_public :: Maybe Value

    Store metadata about the identity which the identity itself can see when calling for example the session endpoint. Do not store sensitive information (e.g. credit score) about the identity in this field.

  • schema_id :: Text

    SchemaID is the ID of the JSON Schema to be used for validating the identity's traits. If set will update the Identity's SchemaID.

  • state :: IdentityState
     
  • traits :: Value

    Traits represent an identity's traits. The identity is able to create, modify, and delete traits in a self-service manner. The input will always be validated against the JSON Schema defined in $sel:schema_id:AdminCreateIdentityBody.

Instances

Instances details
Eq AdminUpdateIdentityBody Source # 
Instance details

Defined in OryKratos.Types.Admin

Data AdminUpdateIdentityBody Source # 
Instance details

Defined in OryKratos.Types.Admin

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AdminUpdateIdentityBody -> c AdminUpdateIdentityBody #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AdminUpdateIdentityBody #

toConstr :: AdminUpdateIdentityBody -> Constr #

dataTypeOf :: AdminUpdateIdentityBody -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AdminUpdateIdentityBody) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AdminUpdateIdentityBody) #

gmapT :: (forall b. Data b => b -> b) -> AdminUpdateIdentityBody -> AdminUpdateIdentityBody #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AdminUpdateIdentityBody -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AdminUpdateIdentityBody -> r #

gmapQ :: (forall d. Data d => d -> u) -> AdminUpdateIdentityBody -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AdminUpdateIdentityBody -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AdminUpdateIdentityBody -> m AdminUpdateIdentityBody #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AdminUpdateIdentityBody -> m AdminUpdateIdentityBody #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AdminUpdateIdentityBody -> m AdminUpdateIdentityBody #

Show AdminUpdateIdentityBody Source # 
Instance details

Defined in OryKratos.Types.Admin

Generic AdminUpdateIdentityBody Source # 
Instance details

Defined in OryKratos.Types.Admin

Associated Types

type Rep AdminUpdateIdentityBody :: Type -> Type #

ToJSON AdminUpdateIdentityBody Source # 
Instance details

Defined in OryKratos.Types.Admin

FromJSON AdminUpdateIdentityBody Source # 
Instance details

Defined in OryKratos.Types.Admin

type Rep AdminUpdateIdentityBody Source # 
Instance details

Defined in OryKratos.Types.Admin

type Rep AdminUpdateIdentityBody = D1 ('MetaData "AdminUpdateIdentityBody" "OryKratos.Types.Admin" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "AdminUpdateIdentityBody" 'PrefixI 'True) ((S1 ('MetaSel ('Just "metadata_admin") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Value)) :*: S1 ('MetaSel ('Just "metadata_public") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Value))) :*: (S1 ('MetaSel ('Just "schema_id") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: (S1 ('MetaSel ('Just "state") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 IdentityState) :*: S1 ('MetaSel ('Just "traits") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Value)))))

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

Instances details
(Eq metadataAdmin, Eq metadataPublic, Eq traits) => Eq (Identity traits metadataAdmin metadataPublic) Source # 
Instance details

Defined in OryKratos.Types.Identity

Methods

(==) :: Identity traits metadataAdmin metadataPublic -> Identity traits metadataAdmin metadataPublic -> Bool #

(/=) :: Identity traits metadataAdmin metadataPublic -> Identity traits metadataAdmin metadataPublic -> Bool #

(Data traits, Data metadataAdmin, Data metadataPublic) => Data (Identity traits metadataAdmin metadataPublic) Source # 
Instance details

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 # 
Instance details

Defined in OryKratos.Types.Identity

Methods

showsPrec :: Int -> Identity traits metadataAdmin metadataPublic -> ShowS #

show :: Identity traits metadataAdmin metadataPublic -> String #

showList :: [Identity traits metadataAdmin metadataPublic] -> ShowS #

Generic (Identity traits metadataAdmin metadataPublic) Source # 
Instance details

Defined in OryKratos.Types.Identity

Associated Types

type Rep (Identity traits metadataAdmin metadataPublic) :: Type -> Type #

Methods

from :: Identity traits metadataAdmin metadataPublic -> Rep (Identity traits metadataAdmin metadataPublic) x #

to :: Rep (Identity traits metadataAdmin metadataPublic) x -> Identity traits metadataAdmin metadataPublic #

(ToJSON traits, ToJSON metadataAdmin, ToJSON metadataPublic) => ToJSON (Identity traits metadataAdmin metadataPublic) Source # 
Instance details

Defined in OryKratos.Types.Identity

Methods

toJSON :: Identity traits metadataAdmin metadataPublic -> Value #

toEncoding :: Identity traits metadataAdmin metadataPublic -> Encoding #

toJSONList :: [Identity traits metadataAdmin metadataPublic] -> Value #

toEncodingList :: [Identity traits metadataAdmin metadataPublic] -> Encoding #

(FromJSON traits, FromJSON metadataAdmin, FromJSON metadataPublic) => FromJSON (Identity traits metadataAdmin metadataPublic) Source # 
Instance details

Defined in OryKratos.Types.Identity

Methods

parseJSON :: Value -> Parser (Identity traits metadataAdmin metadataPublic) #

parseJSONList :: Value -> Parser [Identity traits metadataAdmin metadataPublic] #

type Rep (Identity traits metadataAdmin metadataPublic) Source # 
Instance details

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

Instances details
Eq IdentityCredentials Source # 
Instance details

Defined in OryKratos.Types.Identity

Data IdentityCredentials Source # 
Instance details

Defined in OryKratos.Types.Identity

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IdentityCredentials -> c IdentityCredentials #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IdentityCredentials #

toConstr :: IdentityCredentials -> Constr #

dataTypeOf :: IdentityCredentials -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IdentityCredentials) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IdentityCredentials) #

gmapT :: (forall b. Data b => b -> b) -> IdentityCredentials -> IdentityCredentials #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IdentityCredentials -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IdentityCredentials -> r #

gmapQ :: (forall d. Data d => d -> u) -> IdentityCredentials -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IdentityCredentials -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IdentityCredentials -> m IdentityCredentials #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IdentityCredentials -> m IdentityCredentials #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IdentityCredentials -> m IdentityCredentials #

Show IdentityCredentials Source # 
Instance details

Defined in OryKratos.Types.Identity

Generic IdentityCredentials Source # 
Instance details

Defined in OryKratos.Types.Identity

Associated Types

type Rep IdentityCredentials :: Type -> Type #

ToJSON IdentityCredentials Source # 
Instance details

Defined in OryKratos.Types.Identity

FromJSON IdentityCredentials Source # 
Instance details

Defined in OryKratos.Types.Identity

type Rep IdentityCredentials Source # 
Instance details

Defined in OryKratos.Types.Identity

data IdentityCredentialsOidc Source #

Instances

Instances details
Eq IdentityCredentialsOidc Source # 
Instance details

Defined in OryKratos.Types.Identity

Data IdentityCredentialsOidc Source # 
Instance details

Defined in OryKratos.Types.Identity

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IdentityCredentialsOidc -> c IdentityCredentialsOidc #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IdentityCredentialsOidc #

toConstr :: IdentityCredentialsOidc -> Constr #

dataTypeOf :: IdentityCredentialsOidc -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IdentityCredentialsOidc) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IdentityCredentialsOidc) #

gmapT :: (forall b. Data b => b -> b) -> IdentityCredentialsOidc -> IdentityCredentialsOidc #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IdentityCredentialsOidc -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IdentityCredentialsOidc -> r #

gmapQ :: (forall d. Data d => d -> u) -> IdentityCredentialsOidc -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IdentityCredentialsOidc -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IdentityCredentialsOidc -> m IdentityCredentialsOidc #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IdentityCredentialsOidc -> m IdentityCredentialsOidc #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IdentityCredentialsOidc -> m IdentityCredentialsOidc #

Show IdentityCredentialsOidc Source # 
Instance details

Defined in OryKratos.Types.Identity

Generic IdentityCredentialsOidc Source # 
Instance details

Defined in OryKratos.Types.Identity

Associated Types

type Rep IdentityCredentialsOidc :: Type -> Type #

ToJSON IdentityCredentialsOidc Source # 
Instance details

Defined in OryKratos.Types.Identity

FromJSON IdentityCredentialsOidc Source # 
Instance details

Defined in OryKratos.Types.Identity

type Rep IdentityCredentialsOidc Source # 
Instance details

Defined in OryKratos.Types.Identity

type Rep IdentityCredentialsOidc = D1 ('MetaData "IdentityCredentialsOidc" "OryKratos.Types.Identity" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "IdentityCredentialsOidc" 'PrefixI 'True) (S1 ('MetaSel ('Just "providers") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe [IdentityCredentialsOidcProvider]))))

data IdentityCredentialsOidcProvider Source #

Instances

Instances details
Eq IdentityCredentialsOidcProvider Source # 
Instance details

Defined in OryKratos.Types.Identity

Data IdentityCredentialsOidcProvider Source # 
Instance details

Defined in OryKratos.Types.Identity

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IdentityCredentialsOidcProvider -> c IdentityCredentialsOidcProvider #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IdentityCredentialsOidcProvider #

toConstr :: IdentityCredentialsOidcProvider -> Constr #

dataTypeOf :: IdentityCredentialsOidcProvider -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IdentityCredentialsOidcProvider) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IdentityCredentialsOidcProvider) #

gmapT :: (forall b. Data b => b -> b) -> IdentityCredentialsOidcProvider -> IdentityCredentialsOidcProvider #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IdentityCredentialsOidcProvider -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IdentityCredentialsOidcProvider -> r #

gmapQ :: (forall d. Data d => d -> u) -> IdentityCredentialsOidcProvider -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IdentityCredentialsOidcProvider -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IdentityCredentialsOidcProvider -> m IdentityCredentialsOidcProvider #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IdentityCredentialsOidcProvider -> m IdentityCredentialsOidcProvider #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IdentityCredentialsOidcProvider -> m IdentityCredentialsOidcProvider #

Show IdentityCredentialsOidcProvider Source # 
Instance details

Defined in OryKratos.Types.Identity

Generic IdentityCredentialsOidcProvider Source # 
Instance details

Defined in OryKratos.Types.Identity

Associated Types

type Rep IdentityCredentialsOidcProvider :: Type -> Type #

ToJSON IdentityCredentialsOidcProvider Source # 
Instance details

Defined in OryKratos.Types.Identity

FromJSON IdentityCredentialsOidcProvider Source # 
Instance details

Defined in OryKratos.Types.Identity

type Rep IdentityCredentialsOidcProvider Source # 
Instance details

Defined in OryKratos.Types.Identity

type Rep IdentityCredentialsOidcProvider = D1 ('MetaData "IdentityCredentialsOidcProvider" "OryKratos.Types.Identity" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "IdentityCredentialsOidcProvider" 'PrefixI 'True) ((S1 ('MetaSel ('Just "initial_access_token") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "initial_id_token") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text))) :*: (S1 ('MetaSel ('Just "initial_refresh_token") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: (S1 ('MetaSel ('Just "provider") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "subject") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text))))))

data IdentityCredentialsPassword Source #

Constructors

IdentityCredentialsPassword 

Fields

Instances

Instances details
Eq IdentityCredentialsPassword Source # 
Instance details

Defined in OryKratos.Types.Identity

Data IdentityCredentialsPassword Source # 
Instance details

Defined in OryKratos.Types.Identity

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IdentityCredentialsPassword -> c IdentityCredentialsPassword #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IdentityCredentialsPassword #

toConstr :: IdentityCredentialsPassword -> Constr #

dataTypeOf :: IdentityCredentialsPassword -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IdentityCredentialsPassword) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IdentityCredentialsPassword) #

gmapT :: (forall b. Data b => b -> b) -> IdentityCredentialsPassword -> IdentityCredentialsPassword #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IdentityCredentialsPassword -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IdentityCredentialsPassword -> r #

gmapQ :: (forall d. Data d => d -> u) -> IdentityCredentialsPassword -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IdentityCredentialsPassword -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IdentityCredentialsPassword -> m IdentityCredentialsPassword #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IdentityCredentialsPassword -> m IdentityCredentialsPassword #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IdentityCredentialsPassword -> m IdentityCredentialsPassword #

Show IdentityCredentialsPassword Source # 
Instance details

Defined in OryKratos.Types.Identity

Generic IdentityCredentialsPassword Source # 
Instance details

Defined in OryKratos.Types.Identity

Associated Types

type Rep IdentityCredentialsPassword :: Type -> Type #

ToJSON IdentityCredentialsPassword Source # 
Instance details

Defined in OryKratos.Types.Identity

FromJSON IdentityCredentialsPassword Source # 
Instance details

Defined in OryKratos.Types.Identity

type Rep IdentityCredentialsPassword Source # 
Instance details

Defined in OryKratos.Types.Identity

type Rep IdentityCredentialsPassword = D1 ('MetaData "IdentityCredentialsPassword" "OryKratos.Types.Identity" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "IdentityCredentialsPassword" 'PrefixI 'True) (S1 ('MetaSel ('Just "hashed_password") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text))))

data IdentityCredentialsType Source #

and so on.

Instances

Instances details
Eq IdentityCredentialsType Source # 
Instance details

Defined in OryKratos.Types.Identity

Data IdentityCredentialsType Source # 
Instance details

Defined in OryKratos.Types.Identity

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IdentityCredentialsType -> c IdentityCredentialsType #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IdentityCredentialsType #

toConstr :: IdentityCredentialsType -> Constr #

dataTypeOf :: IdentityCredentialsType -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IdentityCredentialsType) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IdentityCredentialsType) #

gmapT :: (forall b. Data b => b -> b) -> IdentityCredentialsType -> IdentityCredentialsType #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IdentityCredentialsType -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IdentityCredentialsType -> r #

gmapQ :: (forall d. Data d => d -> u) -> IdentityCredentialsType -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IdentityCredentialsType -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IdentityCredentialsType -> m IdentityCredentialsType #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IdentityCredentialsType -> m IdentityCredentialsType #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IdentityCredentialsType -> m IdentityCredentialsType #

Show IdentityCredentialsType Source # 
Instance details

Defined in OryKratos.Types.Identity

Generic IdentityCredentialsType Source # 
Instance details

Defined in OryKratos.Types.Identity

Associated Types

type Rep IdentityCredentialsType :: Type -> Type #

ToJSON IdentityCredentialsType Source # 
Instance details

Defined in OryKratos.Types.Identity

FromJSON IdentityCredentialsType Source # 
Instance details

Defined in OryKratos.Types.Identity

type Rep IdentityCredentialsType Source # 
Instance details

Defined in OryKratos.Types.Identity

type Rep IdentityCredentialsType = D1 ('MetaData "IdentityCredentialsType" "OryKratos.Types.Identity" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) ((C1 ('MetaCons "Password" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TOTP" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "OIDC" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "WebAuthn" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LookupSecret" 'PrefixI 'False) (U1 :: Type -> Type))))

data IdentitySchema Source #

Constructors

IdentitySchema 

Fields

Instances

Instances details
Eq IdentitySchema Source # 
Instance details

Defined in OryKratos.Types.Identity

Data IdentitySchema Source # 
Instance details

Defined in OryKratos.Types.Identity

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IdentitySchema -> c IdentitySchema #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IdentitySchema #

toConstr :: IdentitySchema -> Constr #

dataTypeOf :: IdentitySchema -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IdentitySchema) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IdentitySchema) #

gmapT :: (forall b. Data b => b -> b) -> IdentitySchema -> IdentitySchema #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IdentitySchema -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IdentitySchema -> r #

gmapQ :: (forall d. Data d => d -> u) -> IdentitySchema -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IdentitySchema -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IdentitySchema -> m IdentitySchema #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IdentitySchema -> m IdentitySchema #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IdentitySchema -> m IdentitySchema #

Show IdentitySchema Source # 
Instance details

Defined in OryKratos.Types.Identity

Generic IdentitySchema Source # 
Instance details

Defined in OryKratos.Types.Identity

Associated Types

type Rep IdentitySchema :: Type -> Type #

ToJSON IdentitySchema Source # 
Instance details

Defined in OryKratos.Types.Identity

FromJSON IdentitySchema Source # 
Instance details

Defined in OryKratos.Types.Identity

type Rep IdentitySchema Source # 
Instance details

Defined in OryKratos.Types.Identity

type Rep IdentitySchema = D1 ('MetaData "IdentitySchema" "OryKratos.Types.Identity" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "IdentitySchema" 'PrefixI 'True) (S1 ('MetaSel ('Just "id") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "schema") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Value))))

data IdentityState Source #

The state can either be `active` or `inactive`.

Instances

Instances details
Eq IdentityState Source # 
Instance details

Defined in OryKratos.Types.Identity

Data IdentityState Source # 
Instance details

Defined in OryKratos.Types.Identity

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IdentityState -> c IdentityState #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IdentityState #

toConstr :: IdentityState -> Constr #

dataTypeOf :: IdentityState -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IdentityState) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IdentityState) #

gmapT :: (forall b. Data b => b -> b) -> IdentityState -> IdentityState #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IdentityState -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IdentityState -> r #

gmapQ :: (forall d. Data d => d -> u) -> IdentityState -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IdentityState -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IdentityState -> m IdentityState #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IdentityState -> m IdentityState #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IdentityState -> m IdentityState #

Show IdentityState Source # 
Instance details

Defined in OryKratos.Types.Identity

Generic IdentityState Source # 
Instance details

Defined in OryKratos.Types.Identity

Associated Types

type Rep IdentityState :: Type -> Type #

ToJSON IdentityState Source # 
Instance details

Defined in OryKratos.Types.Identity

FromJSON IdentityState Source # 
Instance details

Defined in OryKratos.Types.Identity

type Rep IdentityState Source # 
Instance details

Defined in OryKratos.Types.Identity

type Rep IdentityState = D1 ('MetaData "IdentityState" "OryKratos.Types.Identity" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "IdentityStateActive" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "IdentityStateInactive" 'PrefixI 'False) (U1 :: Type -> Type))

data Session traits metadataAdmin metadataPublic Source #

A Session

Constructors

Session 

Fields

Instances

Instances details
(Eq metadataAdmin, Eq metadataPublic, Eq traits) => Eq (Session traits metadataAdmin metadataPublic) Source # 
Instance details

Defined in OryKratos.Types.Other

Methods

(==) :: Session traits metadataAdmin metadataPublic -> Session traits metadataAdmin metadataPublic -> Bool #

(/=) :: Session traits metadataAdmin metadataPublic -> Session traits metadataAdmin metadataPublic -> Bool #

(Data traits, Data metadataAdmin, Data metadataPublic) => Data (Session traits metadataAdmin metadataPublic) Source # 
Instance details

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 # 
Instance details

Defined in OryKratos.Types.Other

Methods

showsPrec :: Int -> Session traits metadataAdmin metadataPublic -> ShowS #

show :: Session traits metadataAdmin metadataPublic -> String #

showList :: [Session traits metadataAdmin metadataPublic] -> ShowS #

Generic (Session traits metadataAdmin metadataPublic) Source # 
Instance details

Defined in OryKratos.Types.Other

Associated Types

type Rep (Session traits metadataAdmin metadataPublic) :: Type -> Type #

Methods

from :: Session traits metadataAdmin metadataPublic -> Rep (Session traits metadataAdmin metadataPublic) x #

to :: Rep (Session traits metadataAdmin metadataPublic) x -> Session traits metadataAdmin metadataPublic #

(ToJSON traits, ToJSON metadataAdmin, ToJSON metadataPublic) => ToJSON (Session traits metadataAdmin metadataPublic) Source # 
Instance details

Defined in OryKratos.Types.Other

Methods

toJSON :: Session traits metadataAdmin metadataPublic -> Value #

toEncoding :: Session traits metadataAdmin metadataPublic -> Encoding #

toJSONList :: [Session traits metadataAdmin metadataPublic] -> Value #

toEncodingList :: [Session traits metadataAdmin metadataPublic] -> Encoding #

(FromJSON traits, FromJSON metadataAdmin, FromJSON metadataPublic) => FromJSON (Session traits metadataAdmin metadataPublic) Source # 
Instance details

Defined in OryKratos.Types.Other

Methods

parseJSON :: Value -> Parser (Session traits metadataAdmin metadataPublic) #

parseJSONList :: Value -> Parser [Session traits metadataAdmin metadataPublic] #

type Rep (Session traits metadataAdmin metadataPublic) Source # 
Instance details

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 

Fields

Instances

Instances details
Eq SettingsProfileFormConfig Source # 
Instance details

Defined in OryKratos.Types.Other

Data SettingsProfileFormConfig Source # 
Instance details

Defined in OryKratos.Types.Other

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SettingsProfileFormConfig -> c SettingsProfileFormConfig #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SettingsProfileFormConfig #

toConstr :: SettingsProfileFormConfig -> Constr #

dataTypeOf :: SettingsProfileFormConfig -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SettingsProfileFormConfig) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SettingsProfileFormConfig) #

gmapT :: (forall b. Data b => b -> b) -> SettingsProfileFormConfig -> SettingsProfileFormConfig #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SettingsProfileFormConfig -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SettingsProfileFormConfig -> r #

gmapQ :: (forall d. Data d => d -> u) -> SettingsProfileFormConfig -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SettingsProfileFormConfig -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SettingsProfileFormConfig -> m SettingsProfileFormConfig #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SettingsProfileFormConfig -> m SettingsProfileFormConfig #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SettingsProfileFormConfig -> m SettingsProfileFormConfig #

Show SettingsProfileFormConfig Source # 
Instance details

Defined in OryKratos.Types.Other

Generic SettingsProfileFormConfig Source # 
Instance details

Defined in OryKratos.Types.Other

Associated Types

type Rep SettingsProfileFormConfig :: Type -> Type #

ToJSON SettingsProfileFormConfig Source # 
Instance details

Defined in OryKratos.Types.Other

FromJSON SettingsProfileFormConfig Source # 
Instance details

Defined in OryKratos.Types.Other

type Rep SettingsProfileFormConfig Source # 
Instance details

Defined in OryKratos.Types.Other

type Rep SettingsProfileFormConfig = D1 ('MetaData "SettingsProfileFormConfig" "OryKratos.Types.Other" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "SettingsProfileFormConfig" 'PrefixI 'True) ((S1 ('MetaSel ('Just "action") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "messages") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe [UiText]))) :*: (S1 ('MetaSel ('Just "method") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "nodes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [UiNode]))))

data SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic Source #

The Response for Login Flows via API

Constructors

SuccessfulSelfServiceLoginWithoutBrowser 

Fields

  • session :: Session traits metadataAdmin metadataPublic
     
  • session_token :: Maybe Text

    The Session Token A session token is equivalent to a session cookie, but it can be sent in the HTTP Authorization Header: Authorization: bearer ${session-token} The session token is only issued for API flows, not for Browser flows!

Instances

Instances details
(Eq metadataAdmin, Eq metadataPublic, Eq traits) => Eq (SuccessfulSelfServiceLoginWithoutBrowser traits metadataAdmin metadataPublic) Source # 
Instance details

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 # 
Instance details

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 # 
Instance details

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 # 
Instance details

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 # 
Instance details

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 # 
Instance details

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 # 
Instance details

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

  • identity :: Identity traits metadataAdmin metadataPublic
     
  • session :: Maybe (Session traits metadataAdmin metadataPublic)
     
  • session_token :: Maybe Text

    The Session Token This field is only set when the session hook is configured as a post-registration hook. A session token is equivalent to a session cookie, but it can be sent in the HTTP Authorization Header: Authorization: bearer ${session-token} The session token is only issued for API flows, not for Browser flows!

Instances

Instances details
(Eq metadataAdmin, Eq metadataPublic, Eq traits) => Eq (SuccessfulSelfServiceRegistrationWithoutBrowser traits metadataAdmin metadataPublic) Source # 
Instance details

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 # 
Instance details

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 # 
Instance details

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 # 
Instance details

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 # 
Instance details

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 # 
Instance details

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 # 
Instance details

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

  • csrf_token :: Maybe Text

    Sending the anti-csrf token is only required for browser login flows.

  • identifier :: Text

    Identifier is the email or username of the user trying to log in. This field is only required when using WebAuthn for passwordless login. When using WebAuthn for multi-factor authentication, it is not needed.

  • method :: Text

    Method should be set to "lookup_secret" when logging in using the lookup_secret strategy.

  • password :: Text

    The user's password.

  • password_identifier :: Maybe Text

    Identifier is the email or username of the user trying to log in. This field is deprecated!

  • provider :: Text

    The provider to register with

  • traits :: Maybe Value

    The identity traits. This is a placeholder for the registration flow.

  • totp_code :: Text

    The TOTP code.

  • webauthn_login :: Maybe Text

    Login a WebAuthn Security Key This must contain the ID of the WebAuthN connection.

  • lookup_secret :: Text

    The lookup secret.

Instances

Instances details
Eq SubmitSelfServiceLoginFlowBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Data SubmitSelfServiceLoginFlowBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SubmitSelfServiceLoginFlowBody -> c SubmitSelfServiceLoginFlowBody #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SubmitSelfServiceLoginFlowBody #

toConstr :: SubmitSelfServiceLoginFlowBody -> Constr #

dataTypeOf :: SubmitSelfServiceLoginFlowBody -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SubmitSelfServiceLoginFlowBody) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SubmitSelfServiceLoginFlowBody) #

gmapT :: (forall b. Data b => b -> b) -> SubmitSelfServiceLoginFlowBody -> SubmitSelfServiceLoginFlowBody #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceLoginFlowBody -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceLoginFlowBody -> r #

gmapQ :: (forall d. Data d => d -> u) -> SubmitSelfServiceLoginFlowBody -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SubmitSelfServiceLoginFlowBody -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SubmitSelfServiceLoginFlowBody -> m SubmitSelfServiceLoginFlowBody #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceLoginFlowBody -> m SubmitSelfServiceLoginFlowBody #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceLoginFlowBody -> m SubmitSelfServiceLoginFlowBody #

Show SubmitSelfServiceLoginFlowBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Generic SubmitSelfServiceLoginFlowBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Associated Types

type Rep SubmitSelfServiceLoginFlowBody :: Type -> Type #

ToJSON SubmitSelfServiceLoginFlowBody Source # 
Instance details

Defined in OryKratos.Types.Payload

FromJSON SubmitSelfServiceLoginFlowBody Source # 
Instance details

Defined in OryKratos.Types.Payload

type Rep SubmitSelfServiceLoginFlowBody Source # 
Instance details

Defined in OryKratos.Types.Payload

data SubmitSelfServiceLoginFlowWithLookupSecretMethodBody Source #

Constructors

SubmitSelfServiceLoginFlowWithLookupSecretMethodBody 

Fields

  • csrf_token :: Maybe Text

    Sending the anti-csrf token is only required for browser login flows.

  • lookup_secret :: Text

    The lookup secret.

  • method :: Text

    Method should be set to "lookup_secret" when logging in using the lookup_secret strategy.

Instances

Instances details
Eq SubmitSelfServiceLoginFlowWithLookupSecretMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Data SubmitSelfServiceLoginFlowWithLookupSecretMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody -> c SubmitSelfServiceLoginFlowWithLookupSecretMethodBody #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SubmitSelfServiceLoginFlowWithLookupSecretMethodBody #

toConstr :: SubmitSelfServiceLoginFlowWithLookupSecretMethodBody -> Constr #

dataTypeOf :: SubmitSelfServiceLoginFlowWithLookupSecretMethodBody -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SubmitSelfServiceLoginFlowWithLookupSecretMethodBody) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SubmitSelfServiceLoginFlowWithLookupSecretMethodBody) #

gmapT :: (forall b. Data b => b -> b) -> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody -> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody -> r #

gmapQ :: (forall d. Data d => d -> u) -> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody -> m SubmitSelfServiceLoginFlowWithLookupSecretMethodBody #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody -> m SubmitSelfServiceLoginFlowWithLookupSecretMethodBody #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody -> m SubmitSelfServiceLoginFlowWithLookupSecretMethodBody #

Show SubmitSelfServiceLoginFlowWithLookupSecretMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Generic SubmitSelfServiceLoginFlowWithLookupSecretMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

ToJSON SubmitSelfServiceLoginFlowWithLookupSecretMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

FromJSON SubmitSelfServiceLoginFlowWithLookupSecretMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

type Rep SubmitSelfServiceLoginFlowWithLookupSecretMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

type Rep SubmitSelfServiceLoginFlowWithLookupSecretMethodBody = D1 ('MetaData "SubmitSelfServiceLoginFlowWithLookupSecretMethodBody" "OryKratos.Types.Payload" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "SubmitSelfServiceLoginFlowWithLookupSecretMethodBody" 'PrefixI 'True) (S1 ('MetaSel ('Just "csrf_token") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: (S1 ('MetaSel ('Just "lookup_secret") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "method") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text))))

data SubmitSelfServiceLoginFlowWithOidcMethodBody Source #

SubmitSelfServiceLoginFlowWithOidcMethodBody is used to decode the login form payload when using the oidc method.

Constructors

SubmitSelfServiceLoginFlowWithOidcMethodBody 

Fields

Instances

Instances details
Eq SubmitSelfServiceLoginFlowWithOidcMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Data SubmitSelfServiceLoginFlowWithOidcMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SubmitSelfServiceLoginFlowWithOidcMethodBody -> c SubmitSelfServiceLoginFlowWithOidcMethodBody #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SubmitSelfServiceLoginFlowWithOidcMethodBody #

toConstr :: SubmitSelfServiceLoginFlowWithOidcMethodBody -> Constr #

dataTypeOf :: SubmitSelfServiceLoginFlowWithOidcMethodBody -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SubmitSelfServiceLoginFlowWithOidcMethodBody) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SubmitSelfServiceLoginFlowWithOidcMethodBody) #

gmapT :: (forall b. Data b => b -> b) -> SubmitSelfServiceLoginFlowWithOidcMethodBody -> SubmitSelfServiceLoginFlowWithOidcMethodBody #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceLoginFlowWithOidcMethodBody -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceLoginFlowWithOidcMethodBody -> r #

gmapQ :: (forall d. Data d => d -> u) -> SubmitSelfServiceLoginFlowWithOidcMethodBody -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SubmitSelfServiceLoginFlowWithOidcMethodBody -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SubmitSelfServiceLoginFlowWithOidcMethodBody -> m SubmitSelfServiceLoginFlowWithOidcMethodBody #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceLoginFlowWithOidcMethodBody -> m SubmitSelfServiceLoginFlowWithOidcMethodBody #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceLoginFlowWithOidcMethodBody -> m SubmitSelfServiceLoginFlowWithOidcMethodBody #

Show SubmitSelfServiceLoginFlowWithOidcMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Generic SubmitSelfServiceLoginFlowWithOidcMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

ToJSON SubmitSelfServiceLoginFlowWithOidcMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

FromJSON SubmitSelfServiceLoginFlowWithOidcMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

type Rep SubmitSelfServiceLoginFlowWithOidcMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

type Rep SubmitSelfServiceLoginFlowWithOidcMethodBody = D1 ('MetaData "SubmitSelfServiceLoginFlowWithOidcMethodBody" "OryKratos.Types.Payload" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "SubmitSelfServiceLoginFlowWithOidcMethodBody" 'PrefixI 'True) ((S1 ('MetaSel ('Just "csrf_token") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "method") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)) :*: (S1 ('MetaSel ('Just "provider") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "traits") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Value)))))

data SubmitSelfServiceLoginFlowWithPasswordMethodBody Source #

Constructors

SubmitSelfServiceLoginFlowWithPasswordMethodBody 

Fields

  • csrf_token :: Maybe Text

    Sending the anti-csrf token is only required for browser login flows.

  • identifier :: Text

    Identifier is the email or username of the user trying to log in.

  • method :: Text

    Method should be set to "password" when logging in using the identifier and password strategy.

  • password :: Text

    The user's password.

  • password_identifier :: Maybe Text

    Identifier is the email or username of the user trying to log in. This field is deprecated!

Instances

Instances details
Eq SubmitSelfServiceLoginFlowWithPasswordMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Data SubmitSelfServiceLoginFlowWithPasswordMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SubmitSelfServiceLoginFlowWithPasswordMethodBody -> c SubmitSelfServiceLoginFlowWithPasswordMethodBody #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SubmitSelfServiceLoginFlowWithPasswordMethodBody #

toConstr :: SubmitSelfServiceLoginFlowWithPasswordMethodBody -> Constr #

dataTypeOf :: SubmitSelfServiceLoginFlowWithPasswordMethodBody -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SubmitSelfServiceLoginFlowWithPasswordMethodBody) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SubmitSelfServiceLoginFlowWithPasswordMethodBody) #

gmapT :: (forall b. Data b => b -> b) -> SubmitSelfServiceLoginFlowWithPasswordMethodBody -> SubmitSelfServiceLoginFlowWithPasswordMethodBody #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceLoginFlowWithPasswordMethodBody -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceLoginFlowWithPasswordMethodBody -> r #

gmapQ :: (forall d. Data d => d -> u) -> SubmitSelfServiceLoginFlowWithPasswordMethodBody -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SubmitSelfServiceLoginFlowWithPasswordMethodBody -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SubmitSelfServiceLoginFlowWithPasswordMethodBody -> m SubmitSelfServiceLoginFlowWithPasswordMethodBody #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceLoginFlowWithPasswordMethodBody -> m SubmitSelfServiceLoginFlowWithPasswordMethodBody #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceLoginFlowWithPasswordMethodBody -> m SubmitSelfServiceLoginFlowWithPasswordMethodBody #

Show SubmitSelfServiceLoginFlowWithPasswordMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Generic SubmitSelfServiceLoginFlowWithPasswordMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

ToJSON SubmitSelfServiceLoginFlowWithPasswordMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

FromJSON SubmitSelfServiceLoginFlowWithPasswordMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

type Rep SubmitSelfServiceLoginFlowWithPasswordMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

type Rep SubmitSelfServiceLoginFlowWithPasswordMethodBody = D1 ('MetaData "SubmitSelfServiceLoginFlowWithPasswordMethodBody" "OryKratos.Types.Payload" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "SubmitSelfServiceLoginFlowWithPasswordMethodBody" 'PrefixI 'True) ((S1 ('MetaSel ('Just "csrf_token") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "identifier") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)) :*: (S1 ('MetaSel ('Just "method") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: (S1 ('MetaSel ('Just "password") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "password_identifier") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text))))))

data SubmitSelfServiceLoginFlowWithTotpMethodBody Source #

Constructors

SubmitSelfServiceLoginFlowWithTotpMethodBody 

Fields

Instances

Instances details
Eq SubmitSelfServiceLoginFlowWithTotpMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Data SubmitSelfServiceLoginFlowWithTotpMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SubmitSelfServiceLoginFlowWithTotpMethodBody -> c SubmitSelfServiceLoginFlowWithTotpMethodBody #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SubmitSelfServiceLoginFlowWithTotpMethodBody #

toConstr :: SubmitSelfServiceLoginFlowWithTotpMethodBody -> Constr #

dataTypeOf :: SubmitSelfServiceLoginFlowWithTotpMethodBody -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SubmitSelfServiceLoginFlowWithTotpMethodBody) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SubmitSelfServiceLoginFlowWithTotpMethodBody) #

gmapT :: (forall b. Data b => b -> b) -> SubmitSelfServiceLoginFlowWithTotpMethodBody -> SubmitSelfServiceLoginFlowWithTotpMethodBody #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceLoginFlowWithTotpMethodBody -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceLoginFlowWithTotpMethodBody -> r #

gmapQ :: (forall d. Data d => d -> u) -> SubmitSelfServiceLoginFlowWithTotpMethodBody -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SubmitSelfServiceLoginFlowWithTotpMethodBody -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SubmitSelfServiceLoginFlowWithTotpMethodBody -> m SubmitSelfServiceLoginFlowWithTotpMethodBody #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceLoginFlowWithTotpMethodBody -> m SubmitSelfServiceLoginFlowWithTotpMethodBody #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceLoginFlowWithTotpMethodBody -> m SubmitSelfServiceLoginFlowWithTotpMethodBody #

Show SubmitSelfServiceLoginFlowWithTotpMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Generic SubmitSelfServiceLoginFlowWithTotpMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

ToJSON SubmitSelfServiceLoginFlowWithTotpMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

FromJSON SubmitSelfServiceLoginFlowWithTotpMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

type Rep SubmitSelfServiceLoginFlowWithTotpMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

type Rep SubmitSelfServiceLoginFlowWithTotpMethodBody = D1 ('MetaData "SubmitSelfServiceLoginFlowWithTotpMethodBody" "OryKratos.Types.Payload" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "SubmitSelfServiceLoginFlowWithTotpMethodBody" 'PrefixI 'True) (S1 ('MetaSel ('Just "csrf_token") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: (S1 ('MetaSel ('Just "method") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "totp_code") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text))))

data SubmitSelfServiceLoginFlowWithWebAuthnMethodBody Source #

Constructors

SubmitSelfServiceLoginFlowWithWebAuthnMethodBody 

Fields

  • csrf_token :: Maybe Text

    Sending the anti-csrf token is only required for browser login flows.

  • identifier :: Maybe Text

    Identifier is the email or username of the user trying to log in. This field is only required when using WebAuthn for passwordless login. When using WebAuthn for multi-factor authentication, it is not needed.

  • method :: Text

    Method should be set to "webAuthn" when logging in using the WebAuthn strategy.

  • webauthn_login :: Maybe Text

    Login a WebAuthn Security Key This must contain the ID of the WebAuthN connection.

Instances

Instances details
Eq SubmitSelfServiceLoginFlowWithWebAuthnMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Data SubmitSelfServiceLoginFlowWithWebAuthnMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody -> c SubmitSelfServiceLoginFlowWithWebAuthnMethodBody #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SubmitSelfServiceLoginFlowWithWebAuthnMethodBody #

toConstr :: SubmitSelfServiceLoginFlowWithWebAuthnMethodBody -> Constr #

dataTypeOf :: SubmitSelfServiceLoginFlowWithWebAuthnMethodBody -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SubmitSelfServiceLoginFlowWithWebAuthnMethodBody) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SubmitSelfServiceLoginFlowWithWebAuthnMethodBody) #

gmapT :: (forall b. Data b => b -> b) -> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody -> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody -> r #

gmapQ :: (forall d. Data d => d -> u) -> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody -> m SubmitSelfServiceLoginFlowWithWebAuthnMethodBody #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody -> m SubmitSelfServiceLoginFlowWithWebAuthnMethodBody #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody -> m SubmitSelfServiceLoginFlowWithWebAuthnMethodBody #

Show SubmitSelfServiceLoginFlowWithWebAuthnMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Generic SubmitSelfServiceLoginFlowWithWebAuthnMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

ToJSON SubmitSelfServiceLoginFlowWithWebAuthnMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

FromJSON SubmitSelfServiceLoginFlowWithWebAuthnMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

type Rep SubmitSelfServiceLoginFlowWithWebAuthnMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

type Rep SubmitSelfServiceLoginFlowWithWebAuthnMethodBody = D1 ('MetaData "SubmitSelfServiceLoginFlowWithWebAuthnMethodBody" "OryKratos.Types.Payload" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "SubmitSelfServiceLoginFlowWithWebAuthnMethodBody" 'PrefixI 'True) ((S1 ('MetaSel ('Just "csrf_token") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "identifier") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text))) :*: (S1 ('MetaSel ('Just "method") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "webauthn_login") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)))))

data SubmitSelfServiceLogoutFlowWithoutBrowserBody Source #

nolint:deadcode,unused

Constructors

SubmitSelfServiceLogoutFlowWithoutBrowserBody 

Fields

Instances

Instances details
Eq SubmitSelfServiceLogoutFlowWithoutBrowserBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Data SubmitSelfServiceLogoutFlowWithoutBrowserBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SubmitSelfServiceLogoutFlowWithoutBrowserBody -> c SubmitSelfServiceLogoutFlowWithoutBrowserBody #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SubmitSelfServiceLogoutFlowWithoutBrowserBody #

toConstr :: SubmitSelfServiceLogoutFlowWithoutBrowserBody -> Constr #

dataTypeOf :: SubmitSelfServiceLogoutFlowWithoutBrowserBody -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SubmitSelfServiceLogoutFlowWithoutBrowserBody) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SubmitSelfServiceLogoutFlowWithoutBrowserBody) #

gmapT :: (forall b. Data b => b -> b) -> SubmitSelfServiceLogoutFlowWithoutBrowserBody -> SubmitSelfServiceLogoutFlowWithoutBrowserBody #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceLogoutFlowWithoutBrowserBody -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceLogoutFlowWithoutBrowserBody -> r #

gmapQ :: (forall d. Data d => d -> u) -> SubmitSelfServiceLogoutFlowWithoutBrowserBody -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SubmitSelfServiceLogoutFlowWithoutBrowserBody -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SubmitSelfServiceLogoutFlowWithoutBrowserBody -> m SubmitSelfServiceLogoutFlowWithoutBrowserBody #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceLogoutFlowWithoutBrowserBody -> m SubmitSelfServiceLogoutFlowWithoutBrowserBody #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceLogoutFlowWithoutBrowserBody -> m SubmitSelfServiceLogoutFlowWithoutBrowserBody #

Show SubmitSelfServiceLogoutFlowWithoutBrowserBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Generic SubmitSelfServiceLogoutFlowWithoutBrowserBody Source # 
Instance details

Defined in OryKratos.Types.Payload

ToJSON SubmitSelfServiceLogoutFlowWithoutBrowserBody Source # 
Instance details

Defined in OryKratos.Types.Payload

FromJSON SubmitSelfServiceLogoutFlowWithoutBrowserBody Source # 
Instance details

Defined in OryKratos.Types.Payload

type Rep SubmitSelfServiceLogoutFlowWithoutBrowserBody Source # 
Instance details

Defined in OryKratos.Types.Payload

type Rep SubmitSelfServiceLogoutFlowWithoutBrowserBody = D1 ('MetaData "SubmitSelfServiceLogoutFlowWithoutBrowserBody" "OryKratos.Types.Payload" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "SubmitSelfServiceLogoutFlowWithoutBrowserBody" 'PrefixI 'True) (S1 ('MetaSel ('Just "session_token") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

data SubmitSelfServiceRecoveryFlowBody Source #

Constructors

SubmitSelfServiceRecoveryFlowBody 

Fields

  • csrf_token :: Maybe Text

    Sending the anti-csrf token is only required for browser login flows.

  • email :: Text

    Email to Recover Needs to be set when initiating the flow. If the email is a registered recovery email, a recovery link will be sent. If the email is not known, a email with details on what happened will be sent instead. format: email

  • method :: Text

    Method supports $sel:link:SubmitSelfServiceSettingsFlowBody only right now.

Instances

Instances details
Eq SubmitSelfServiceRecoveryFlowBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Data SubmitSelfServiceRecoveryFlowBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SubmitSelfServiceRecoveryFlowBody -> c SubmitSelfServiceRecoveryFlowBody #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SubmitSelfServiceRecoveryFlowBody #

toConstr :: SubmitSelfServiceRecoveryFlowBody -> Constr #

dataTypeOf :: SubmitSelfServiceRecoveryFlowBody -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SubmitSelfServiceRecoveryFlowBody) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SubmitSelfServiceRecoveryFlowBody) #

gmapT :: (forall b. Data b => b -> b) -> SubmitSelfServiceRecoveryFlowBody -> SubmitSelfServiceRecoveryFlowBody #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceRecoveryFlowBody -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceRecoveryFlowBody -> r #

gmapQ :: (forall d. Data d => d -> u) -> SubmitSelfServiceRecoveryFlowBody -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SubmitSelfServiceRecoveryFlowBody -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SubmitSelfServiceRecoveryFlowBody -> m SubmitSelfServiceRecoveryFlowBody #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceRecoveryFlowBody -> m SubmitSelfServiceRecoveryFlowBody #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceRecoveryFlowBody -> m SubmitSelfServiceRecoveryFlowBody #

Show SubmitSelfServiceRecoveryFlowBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Generic SubmitSelfServiceRecoveryFlowBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Associated Types

type Rep SubmitSelfServiceRecoveryFlowBody :: Type -> Type #

ToJSON SubmitSelfServiceRecoveryFlowBody Source # 
Instance details

Defined in OryKratos.Types.Payload

FromJSON SubmitSelfServiceRecoveryFlowBody Source # 
Instance details

Defined in OryKratos.Types.Payload

type Rep SubmitSelfServiceRecoveryFlowBody Source # 
Instance details

Defined in OryKratos.Types.Payload

type Rep SubmitSelfServiceRecoveryFlowBody = D1 ('MetaData "SubmitSelfServiceRecoveryFlowBody" "OryKratos.Types.Payload" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "SubmitSelfServiceRecoveryFlowBody" 'PrefixI 'True) (S1 ('MetaSel ('Just "csrf_token") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: (S1 ('MetaSel ('Just "email") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "method") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text))))

data SubmitSelfServiceRecoveryFlowWithLinkMethodBody Source #

Constructors

SubmitSelfServiceRecoveryFlowWithLinkMethodBody 

Fields

  • csrf_token :: Maybe Text

    Sending the anti-csrf token is only required for browser login flows.

  • email :: Text

    Email to Recover Needs to be set when initiating the flow. If the email is a registered recovery email, a recovery link will be sent. If the email is not known, a email with details on what happened will be sent instead. format: email

  • method :: Text

    Method supports $sel:link:SubmitSelfServiceSettingsFlowBody only right now.

Instances

Instances details
Eq SubmitSelfServiceRecoveryFlowWithLinkMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Data SubmitSelfServiceRecoveryFlowWithLinkMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SubmitSelfServiceRecoveryFlowWithLinkMethodBody -> c SubmitSelfServiceRecoveryFlowWithLinkMethodBody #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SubmitSelfServiceRecoveryFlowWithLinkMethodBody #

toConstr :: SubmitSelfServiceRecoveryFlowWithLinkMethodBody -> Constr #

dataTypeOf :: SubmitSelfServiceRecoveryFlowWithLinkMethodBody -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SubmitSelfServiceRecoveryFlowWithLinkMethodBody) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SubmitSelfServiceRecoveryFlowWithLinkMethodBody) #

gmapT :: (forall b. Data b => b -> b) -> SubmitSelfServiceRecoveryFlowWithLinkMethodBody -> SubmitSelfServiceRecoveryFlowWithLinkMethodBody #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceRecoveryFlowWithLinkMethodBody -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceRecoveryFlowWithLinkMethodBody -> r #

gmapQ :: (forall d. Data d => d -> u) -> SubmitSelfServiceRecoveryFlowWithLinkMethodBody -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SubmitSelfServiceRecoveryFlowWithLinkMethodBody -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SubmitSelfServiceRecoveryFlowWithLinkMethodBody -> m SubmitSelfServiceRecoveryFlowWithLinkMethodBody #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceRecoveryFlowWithLinkMethodBody -> m SubmitSelfServiceRecoveryFlowWithLinkMethodBody #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceRecoveryFlowWithLinkMethodBody -> m SubmitSelfServiceRecoveryFlowWithLinkMethodBody #

Show SubmitSelfServiceRecoveryFlowWithLinkMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Generic SubmitSelfServiceRecoveryFlowWithLinkMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

ToJSON SubmitSelfServiceRecoveryFlowWithLinkMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

FromJSON SubmitSelfServiceRecoveryFlowWithLinkMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

type Rep SubmitSelfServiceRecoveryFlowWithLinkMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

type Rep SubmitSelfServiceRecoveryFlowWithLinkMethodBody = D1 ('MetaData "SubmitSelfServiceRecoveryFlowWithLinkMethodBody" "OryKratos.Types.Payload" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "SubmitSelfServiceRecoveryFlowWithLinkMethodBody" 'PrefixI 'True) (S1 ('MetaSel ('Just "csrf_token") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: (S1 ('MetaSel ('Just "email") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "method") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text))))

data SubmitSelfServiceRegistrationFlowBody Source #

Constructors

SubmitSelfServiceRegistrationFlowBody 

Fields

Instances

Instances details
Eq SubmitSelfServiceRegistrationFlowBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Data SubmitSelfServiceRegistrationFlowBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SubmitSelfServiceRegistrationFlowBody -> c SubmitSelfServiceRegistrationFlowBody #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SubmitSelfServiceRegistrationFlowBody #

toConstr :: SubmitSelfServiceRegistrationFlowBody -> Constr #

dataTypeOf :: SubmitSelfServiceRegistrationFlowBody -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SubmitSelfServiceRegistrationFlowBody) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SubmitSelfServiceRegistrationFlowBody) #

gmapT :: (forall b. Data b => b -> b) -> SubmitSelfServiceRegistrationFlowBody -> SubmitSelfServiceRegistrationFlowBody #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceRegistrationFlowBody -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceRegistrationFlowBody -> r #

gmapQ :: (forall d. Data d => d -> u) -> SubmitSelfServiceRegistrationFlowBody -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SubmitSelfServiceRegistrationFlowBody -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SubmitSelfServiceRegistrationFlowBody -> m SubmitSelfServiceRegistrationFlowBody #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceRegistrationFlowBody -> m SubmitSelfServiceRegistrationFlowBody #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceRegistrationFlowBody -> m SubmitSelfServiceRegistrationFlowBody #

Show SubmitSelfServiceRegistrationFlowBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Generic SubmitSelfServiceRegistrationFlowBody Source # 
Instance details

Defined in OryKratos.Types.Payload

ToJSON SubmitSelfServiceRegistrationFlowBody Source # 
Instance details

Defined in OryKratos.Types.Payload

FromJSON SubmitSelfServiceRegistrationFlowBody Source # 
Instance details

Defined in OryKratos.Types.Payload

type Rep SubmitSelfServiceRegistrationFlowBody Source # 
Instance details

Defined in OryKratos.Types.Payload

type Rep SubmitSelfServiceRegistrationFlowBody = D1 ('MetaData "SubmitSelfServiceRegistrationFlowBody" "OryKratos.Types.Payload" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "SubmitSelfServiceRegistrationFlowBody" 'PrefixI 'True) ((S1 ('MetaSel ('Just "csrf_token") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: (S1 ('MetaSel ('Just "method") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "password") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text))) :*: ((S1 ('MetaSel ('Just "traits") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Value) :*: S1 ('MetaSel ('Just "provider") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)) :*: (S1 ('MetaSel ('Just "webauthn_register") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "webauthn_register_displayname") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text))))))

data SubmitSelfServiceRegistrationFlowWithOidcMethodBody Source #

SubmitSelfServiceRegistrationFlowWithOidcMethodBody is used to decode the registration form payload when using the oidc method.

Constructors

SubmitSelfServiceRegistrationFlowWithOidcMethodBody 

Fields

Instances

Instances details
Eq SubmitSelfServiceRegistrationFlowWithOidcMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Data SubmitSelfServiceRegistrationFlowWithOidcMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SubmitSelfServiceRegistrationFlowWithOidcMethodBody -> c SubmitSelfServiceRegistrationFlowWithOidcMethodBody #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SubmitSelfServiceRegistrationFlowWithOidcMethodBody #

toConstr :: SubmitSelfServiceRegistrationFlowWithOidcMethodBody -> Constr #

dataTypeOf :: SubmitSelfServiceRegistrationFlowWithOidcMethodBody -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SubmitSelfServiceRegistrationFlowWithOidcMethodBody) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SubmitSelfServiceRegistrationFlowWithOidcMethodBody) #

gmapT :: (forall b. Data b => b -> b) -> SubmitSelfServiceRegistrationFlowWithOidcMethodBody -> SubmitSelfServiceRegistrationFlowWithOidcMethodBody #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceRegistrationFlowWithOidcMethodBody -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceRegistrationFlowWithOidcMethodBody -> r #

gmapQ :: (forall d. Data d => d -> u) -> SubmitSelfServiceRegistrationFlowWithOidcMethodBody -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SubmitSelfServiceRegistrationFlowWithOidcMethodBody -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SubmitSelfServiceRegistrationFlowWithOidcMethodBody -> m SubmitSelfServiceRegistrationFlowWithOidcMethodBody #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceRegistrationFlowWithOidcMethodBody -> m SubmitSelfServiceRegistrationFlowWithOidcMethodBody #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceRegistrationFlowWithOidcMethodBody -> m SubmitSelfServiceRegistrationFlowWithOidcMethodBody #

Show SubmitSelfServiceRegistrationFlowWithOidcMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Generic SubmitSelfServiceRegistrationFlowWithOidcMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

ToJSON SubmitSelfServiceRegistrationFlowWithOidcMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

FromJSON SubmitSelfServiceRegistrationFlowWithOidcMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

type Rep SubmitSelfServiceRegistrationFlowWithOidcMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

type Rep SubmitSelfServiceRegistrationFlowWithOidcMethodBody = D1 ('MetaData "SubmitSelfServiceRegistrationFlowWithOidcMethodBody" "OryKratos.Types.Payload" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "SubmitSelfServiceRegistrationFlowWithOidcMethodBody" 'PrefixI 'True) ((S1 ('MetaSel ('Just "csrf_token") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "method") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)) :*: (S1 ('MetaSel ('Just "provider") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "traits") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Value)))))

data SubmitSelfServiceRegistrationFlowWithPasswordMethodBody Source #

SubmitSelfServiceRegistrationFlowWithPasswordMethodBody is used to decode the registration form payload when using the password method.

Constructors

SubmitSelfServiceRegistrationFlowWithPasswordMethodBody 

Fields

Instances

Instances details
Eq SubmitSelfServiceRegistrationFlowWithPasswordMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Data SubmitSelfServiceRegistrationFlowWithPasswordMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody -> c SubmitSelfServiceRegistrationFlowWithPasswordMethodBody #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SubmitSelfServiceRegistrationFlowWithPasswordMethodBody #

toConstr :: SubmitSelfServiceRegistrationFlowWithPasswordMethodBody -> Constr #

dataTypeOf :: SubmitSelfServiceRegistrationFlowWithPasswordMethodBody -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SubmitSelfServiceRegistrationFlowWithPasswordMethodBody) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SubmitSelfServiceRegistrationFlowWithPasswordMethodBody) #

gmapT :: (forall b. Data b => b -> b) -> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody -> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody -> r #

gmapQ :: (forall d. Data d => d -> u) -> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody -> m SubmitSelfServiceRegistrationFlowWithPasswordMethodBody #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody -> m SubmitSelfServiceRegistrationFlowWithPasswordMethodBody #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody -> m SubmitSelfServiceRegistrationFlowWithPasswordMethodBody #

Show SubmitSelfServiceRegistrationFlowWithPasswordMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Generic SubmitSelfServiceRegistrationFlowWithPasswordMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

ToJSON SubmitSelfServiceRegistrationFlowWithPasswordMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

FromJSON SubmitSelfServiceRegistrationFlowWithPasswordMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

type Rep SubmitSelfServiceRegistrationFlowWithPasswordMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

type Rep SubmitSelfServiceRegistrationFlowWithPasswordMethodBody = D1 ('MetaData "SubmitSelfServiceRegistrationFlowWithPasswordMethodBody" "OryKratos.Types.Payload" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "SubmitSelfServiceRegistrationFlowWithPasswordMethodBody" 'PrefixI 'True) ((S1 ('MetaSel ('Just "csrf_token") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "method") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)) :*: (S1 ('MetaSel ('Just "password") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "traits") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Value))))

data SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody Source #

Constructors

SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody 

Fields

Instances

Instances details
Eq SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Data SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody -> c SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody #

toConstr :: SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody -> Constr #

dataTypeOf :: SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody) #

gmapT :: (forall b. Data b => b -> b) -> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody -> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody -> r #

gmapQ :: (forall d. Data d => d -> u) -> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody -> m SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody -> m SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody -> m SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody #

Show SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Generic SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

ToJSON SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

FromJSON SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

type Rep SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

type Rep SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody = D1 ('MetaData "SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody" "OryKratos.Types.Payload" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody" 'PrefixI 'True) ((S1 ('MetaSel ('Just "csrf_token") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "method") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)) :*: (S1 ('MetaSel ('Just "traits") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Value) :*: (S1 ('MetaSel ('Just "webauthn_register") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "webauthn_register_displayname") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text))))))

data SubmitSelfServiceSettingsFlowBody Source #

Constructors

SubmitSelfServiceSettingsFlowBody 

Fields

Instances

Instances details
Eq SubmitSelfServiceSettingsFlowBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Data SubmitSelfServiceSettingsFlowBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SubmitSelfServiceSettingsFlowBody -> c SubmitSelfServiceSettingsFlowBody #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SubmitSelfServiceSettingsFlowBody #

toConstr :: SubmitSelfServiceSettingsFlowBody -> Constr #

dataTypeOf :: SubmitSelfServiceSettingsFlowBody -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SubmitSelfServiceSettingsFlowBody) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SubmitSelfServiceSettingsFlowBody) #

gmapT :: (forall b. Data b => b -> b) -> SubmitSelfServiceSettingsFlowBody -> SubmitSelfServiceSettingsFlowBody #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceSettingsFlowBody -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceSettingsFlowBody -> r #

gmapQ :: (forall d. Data d => d -> u) -> SubmitSelfServiceSettingsFlowBody -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SubmitSelfServiceSettingsFlowBody -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SubmitSelfServiceSettingsFlowBody -> m SubmitSelfServiceSettingsFlowBody #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceSettingsFlowBody -> m SubmitSelfServiceSettingsFlowBody #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceSettingsFlowBody -> m SubmitSelfServiceSettingsFlowBody #

Show SubmitSelfServiceSettingsFlowBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Generic SubmitSelfServiceSettingsFlowBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Associated Types

type Rep SubmitSelfServiceSettingsFlowBody :: Type -> Type #

ToJSON SubmitSelfServiceSettingsFlowBody Source # 
Instance details

Defined in OryKratos.Types.Payload

FromJSON SubmitSelfServiceSettingsFlowBody Source # 
Instance details

Defined in OryKratos.Types.Payload

type Rep SubmitSelfServiceSettingsFlowBody Source # 
Instance details

Defined in OryKratos.Types.Payload

type Rep SubmitSelfServiceSettingsFlowBody = D1 ('MetaData "SubmitSelfServiceSettingsFlowBody" "OryKratos.Types.Payload" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "SubmitSelfServiceSettingsFlowBody" 'PrefixI 'True) ((((S1 ('MetaSel ('Just "csrf_token") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "method") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)) :*: (S1 ('MetaSel ('Just "password") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "traits") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Value))) :*: ((S1 ('MetaSel ('Just "flow") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "link") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text))) :*: (S1 ('MetaSel ('Just "unlink") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "totp_code") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text))))) :*: (((S1 ('MetaSel ('Just "totp_unlink") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool)) :*: S1 ('MetaSel ('Just "webauthn_register") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text))) :*: (S1 ('MetaSel ('Just "webauthn_register_displayname") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "webauthn_remove") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)))) :*: ((S1 ('MetaSel ('Just "lookup_secret_confirm") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool)) :*: S1 ('MetaSel ('Just "lookup_secret_disable") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool))) :*: (S1 ('MetaSel ('Just "lookup_secret_regenerate") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool)) :*: S1 ('MetaSel ('Just "lookup_secret_reveal") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool)))))))

data SubmitSelfServiceSettingsFlowWithLookupMethodBody Source #

Constructors

SubmitSelfServiceSettingsFlowWithLookupMethodBody 

Fields

Instances

Instances details
Eq SubmitSelfServiceSettingsFlowWithLookupMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Data SubmitSelfServiceSettingsFlowWithLookupMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SubmitSelfServiceSettingsFlowWithLookupMethodBody -> c SubmitSelfServiceSettingsFlowWithLookupMethodBody #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SubmitSelfServiceSettingsFlowWithLookupMethodBody #

toConstr :: SubmitSelfServiceSettingsFlowWithLookupMethodBody -> Constr #

dataTypeOf :: SubmitSelfServiceSettingsFlowWithLookupMethodBody -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SubmitSelfServiceSettingsFlowWithLookupMethodBody) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SubmitSelfServiceSettingsFlowWithLookupMethodBody) #

gmapT :: (forall b. Data b => b -> b) -> SubmitSelfServiceSettingsFlowWithLookupMethodBody -> SubmitSelfServiceSettingsFlowWithLookupMethodBody #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceSettingsFlowWithLookupMethodBody -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceSettingsFlowWithLookupMethodBody -> r #

gmapQ :: (forall d. Data d => d -> u) -> SubmitSelfServiceSettingsFlowWithLookupMethodBody -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SubmitSelfServiceSettingsFlowWithLookupMethodBody -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SubmitSelfServiceSettingsFlowWithLookupMethodBody -> m SubmitSelfServiceSettingsFlowWithLookupMethodBody #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceSettingsFlowWithLookupMethodBody -> m SubmitSelfServiceSettingsFlowWithLookupMethodBody #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceSettingsFlowWithLookupMethodBody -> m SubmitSelfServiceSettingsFlowWithLookupMethodBody #

Show SubmitSelfServiceSettingsFlowWithLookupMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Generic SubmitSelfServiceSettingsFlowWithLookupMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

ToJSON SubmitSelfServiceSettingsFlowWithLookupMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

FromJSON SubmitSelfServiceSettingsFlowWithLookupMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

type Rep SubmitSelfServiceSettingsFlowWithLookupMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

type Rep SubmitSelfServiceSettingsFlowWithLookupMethodBody = D1 ('MetaData "SubmitSelfServiceSettingsFlowWithLookupMethodBody" "OryKratos.Types.Payload" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "SubmitSelfServiceSettingsFlowWithLookupMethodBody" 'PrefixI 'True) ((S1 ('MetaSel ('Just "csrf_token") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: (S1 ('MetaSel ('Just "lookup_secret_confirm") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool)) :*: S1 ('MetaSel ('Just "lookup_secret_disable") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool)))) :*: (S1 ('MetaSel ('Just "lookup_secret_regenerate") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool)) :*: (S1 ('MetaSel ('Just "lookup_secret_reveal") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool)) :*: S1 ('MetaSel ('Just "method") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))))

data SubmitSelfServiceSettingsFlowWithOidcMethodBody Source #

nolint:deadcode,unused

Constructors

SubmitSelfServiceSettingsFlowWithOidcMethodBody 

Fields

Instances

Instances details
Eq SubmitSelfServiceSettingsFlowWithOidcMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Data SubmitSelfServiceSettingsFlowWithOidcMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SubmitSelfServiceSettingsFlowWithOidcMethodBody -> c SubmitSelfServiceSettingsFlowWithOidcMethodBody #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SubmitSelfServiceSettingsFlowWithOidcMethodBody #

toConstr :: SubmitSelfServiceSettingsFlowWithOidcMethodBody -> Constr #

dataTypeOf :: SubmitSelfServiceSettingsFlowWithOidcMethodBody -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SubmitSelfServiceSettingsFlowWithOidcMethodBody) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SubmitSelfServiceSettingsFlowWithOidcMethodBody) #

gmapT :: (forall b. Data b => b -> b) -> SubmitSelfServiceSettingsFlowWithOidcMethodBody -> SubmitSelfServiceSettingsFlowWithOidcMethodBody #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceSettingsFlowWithOidcMethodBody -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceSettingsFlowWithOidcMethodBody -> r #

gmapQ :: (forall d. Data d => d -> u) -> SubmitSelfServiceSettingsFlowWithOidcMethodBody -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SubmitSelfServiceSettingsFlowWithOidcMethodBody -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SubmitSelfServiceSettingsFlowWithOidcMethodBody -> m SubmitSelfServiceSettingsFlowWithOidcMethodBody #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceSettingsFlowWithOidcMethodBody -> m SubmitSelfServiceSettingsFlowWithOidcMethodBody #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceSettingsFlowWithOidcMethodBody -> m SubmitSelfServiceSettingsFlowWithOidcMethodBody #

Show SubmitSelfServiceSettingsFlowWithOidcMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Generic SubmitSelfServiceSettingsFlowWithOidcMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

ToJSON SubmitSelfServiceSettingsFlowWithOidcMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

FromJSON SubmitSelfServiceSettingsFlowWithOidcMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

type Rep SubmitSelfServiceSettingsFlowWithOidcMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

type Rep SubmitSelfServiceSettingsFlowWithOidcMethodBody = D1 ('MetaData "SubmitSelfServiceSettingsFlowWithOidcMethodBody" "OryKratos.Types.Payload" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "SubmitSelfServiceSettingsFlowWithOidcMethodBody" 'PrefixI 'True) ((S1 ('MetaSel ('Just "flow") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "link") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text))) :*: (S1 ('MetaSel ('Just "method") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: (S1 ('MetaSel ('Just "traits") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Value)) :*: S1 ('MetaSel ('Just "unlink") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text))))))

data SubmitSelfServiceSettingsFlowWithPasswordMethodBody Source #

Constructors

SubmitSelfServiceSettingsFlowWithPasswordMethodBody 

Fields

Instances

Instances details
Eq SubmitSelfServiceSettingsFlowWithPasswordMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Data SubmitSelfServiceSettingsFlowWithPasswordMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SubmitSelfServiceSettingsFlowWithPasswordMethodBody -> c SubmitSelfServiceSettingsFlowWithPasswordMethodBody #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SubmitSelfServiceSettingsFlowWithPasswordMethodBody #

toConstr :: SubmitSelfServiceSettingsFlowWithPasswordMethodBody -> Constr #

dataTypeOf :: SubmitSelfServiceSettingsFlowWithPasswordMethodBody -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SubmitSelfServiceSettingsFlowWithPasswordMethodBody) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SubmitSelfServiceSettingsFlowWithPasswordMethodBody) #

gmapT :: (forall b. Data b => b -> b) -> SubmitSelfServiceSettingsFlowWithPasswordMethodBody -> SubmitSelfServiceSettingsFlowWithPasswordMethodBody #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceSettingsFlowWithPasswordMethodBody -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceSettingsFlowWithPasswordMethodBody -> r #

gmapQ :: (forall d. Data d => d -> u) -> SubmitSelfServiceSettingsFlowWithPasswordMethodBody -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SubmitSelfServiceSettingsFlowWithPasswordMethodBody -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SubmitSelfServiceSettingsFlowWithPasswordMethodBody -> m SubmitSelfServiceSettingsFlowWithPasswordMethodBody #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceSettingsFlowWithPasswordMethodBody -> m SubmitSelfServiceSettingsFlowWithPasswordMethodBody #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceSettingsFlowWithPasswordMethodBody -> m SubmitSelfServiceSettingsFlowWithPasswordMethodBody #

Show SubmitSelfServiceSettingsFlowWithPasswordMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Generic SubmitSelfServiceSettingsFlowWithPasswordMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

ToJSON SubmitSelfServiceSettingsFlowWithPasswordMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

FromJSON SubmitSelfServiceSettingsFlowWithPasswordMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

type Rep SubmitSelfServiceSettingsFlowWithPasswordMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

type Rep SubmitSelfServiceSettingsFlowWithPasswordMethodBody = D1 ('MetaData "SubmitSelfServiceSettingsFlowWithPasswordMethodBody" "OryKratos.Types.Payload" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "SubmitSelfServiceSettingsFlowWithPasswordMethodBody" 'PrefixI 'True) (S1 ('MetaSel ('Just "csrf_token") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: (S1 ('MetaSel ('Just "method") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "password") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text))))

data SubmitSelfServiceSettingsFlowWithProfileMethodBody Source #

nolint:deadcode,unused

Constructors

SubmitSelfServiceSettingsFlowWithProfileMethodBody 

Fields

  • csrf_token :: Maybe Text

    The Anti-CSRF Token This token is only required when performing browser flows.

  • method :: Text

    Method Should be set to profile when trying to update a profile.

  • traits :: Value

    Traits contains all of the identity's traits.

Instances

Instances details
Eq SubmitSelfServiceSettingsFlowWithProfileMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Data SubmitSelfServiceSettingsFlowWithProfileMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SubmitSelfServiceSettingsFlowWithProfileMethodBody -> c SubmitSelfServiceSettingsFlowWithProfileMethodBody #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SubmitSelfServiceSettingsFlowWithProfileMethodBody #

toConstr :: SubmitSelfServiceSettingsFlowWithProfileMethodBody -> Constr #

dataTypeOf :: SubmitSelfServiceSettingsFlowWithProfileMethodBody -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SubmitSelfServiceSettingsFlowWithProfileMethodBody) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SubmitSelfServiceSettingsFlowWithProfileMethodBody) #

gmapT :: (forall b. Data b => b -> b) -> SubmitSelfServiceSettingsFlowWithProfileMethodBody -> SubmitSelfServiceSettingsFlowWithProfileMethodBody #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceSettingsFlowWithProfileMethodBody -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceSettingsFlowWithProfileMethodBody -> r #

gmapQ :: (forall d. Data d => d -> u) -> SubmitSelfServiceSettingsFlowWithProfileMethodBody -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SubmitSelfServiceSettingsFlowWithProfileMethodBody -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SubmitSelfServiceSettingsFlowWithProfileMethodBody -> m SubmitSelfServiceSettingsFlowWithProfileMethodBody #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceSettingsFlowWithProfileMethodBody -> m SubmitSelfServiceSettingsFlowWithProfileMethodBody #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceSettingsFlowWithProfileMethodBody -> m SubmitSelfServiceSettingsFlowWithProfileMethodBody #

Show SubmitSelfServiceSettingsFlowWithProfileMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Generic SubmitSelfServiceSettingsFlowWithProfileMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

ToJSON SubmitSelfServiceSettingsFlowWithProfileMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

FromJSON SubmitSelfServiceSettingsFlowWithProfileMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

type Rep SubmitSelfServiceSettingsFlowWithProfileMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

type Rep SubmitSelfServiceSettingsFlowWithProfileMethodBody = D1 ('MetaData "SubmitSelfServiceSettingsFlowWithProfileMethodBody" "OryKratos.Types.Payload" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "SubmitSelfServiceSettingsFlowWithProfileMethodBody" 'PrefixI 'True) (S1 ('MetaSel ('Just "csrf_token") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: (S1 ('MetaSel ('Just "method") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "traits") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Value))))

data SubmitSelfServiceSettingsFlowWithTotpMethodBody Source #

Constructors

SubmitSelfServiceSettingsFlowWithTotpMethodBody 

Fields

  • csrf_token :: Maybe Text

    CSRFToken is the anti-CSRF token

  • method :: Text

    Method Should be set to "totp" when trying to add, update, or remove a totp pairing.

  • totp_code :: Maybe Text

    ValidationTOTP must contain a valid TOTP based on the

  • totp_unlink :: Maybe Bool

    UnlinkTOTP if true will remove the TOTP pairing, effectively removing the credential. This can be used to set up a new TOTP device.

Instances

Instances details
Eq SubmitSelfServiceSettingsFlowWithTotpMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Data SubmitSelfServiceSettingsFlowWithTotpMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SubmitSelfServiceSettingsFlowWithTotpMethodBody -> c SubmitSelfServiceSettingsFlowWithTotpMethodBody #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SubmitSelfServiceSettingsFlowWithTotpMethodBody #

toConstr :: SubmitSelfServiceSettingsFlowWithTotpMethodBody -> Constr #

dataTypeOf :: SubmitSelfServiceSettingsFlowWithTotpMethodBody -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SubmitSelfServiceSettingsFlowWithTotpMethodBody) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SubmitSelfServiceSettingsFlowWithTotpMethodBody) #

gmapT :: (forall b. Data b => b -> b) -> SubmitSelfServiceSettingsFlowWithTotpMethodBody -> SubmitSelfServiceSettingsFlowWithTotpMethodBody #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceSettingsFlowWithTotpMethodBody -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceSettingsFlowWithTotpMethodBody -> r #

gmapQ :: (forall d. Data d => d -> u) -> SubmitSelfServiceSettingsFlowWithTotpMethodBody -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SubmitSelfServiceSettingsFlowWithTotpMethodBody -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SubmitSelfServiceSettingsFlowWithTotpMethodBody -> m SubmitSelfServiceSettingsFlowWithTotpMethodBody #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceSettingsFlowWithTotpMethodBody -> m SubmitSelfServiceSettingsFlowWithTotpMethodBody #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceSettingsFlowWithTotpMethodBody -> m SubmitSelfServiceSettingsFlowWithTotpMethodBody #

Show SubmitSelfServiceSettingsFlowWithTotpMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Generic SubmitSelfServiceSettingsFlowWithTotpMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

ToJSON SubmitSelfServiceSettingsFlowWithTotpMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

FromJSON SubmitSelfServiceSettingsFlowWithTotpMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

type Rep SubmitSelfServiceSettingsFlowWithTotpMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

type Rep SubmitSelfServiceSettingsFlowWithTotpMethodBody = D1 ('MetaData "SubmitSelfServiceSettingsFlowWithTotpMethodBody" "OryKratos.Types.Payload" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "SubmitSelfServiceSettingsFlowWithTotpMethodBody" 'PrefixI 'True) ((S1 ('MetaSel ('Just "csrf_token") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "method") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)) :*: (S1 ('MetaSel ('Just "totp_code") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "totp_unlink") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool)))))

data SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody Source #

Constructors

SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody 

Fields

Instances

Instances details
Eq SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Data SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody -> c SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody #

toConstr :: SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody -> Constr #

dataTypeOf :: SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody) #

gmapT :: (forall b. Data b => b -> b) -> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody -> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody -> r #

gmapQ :: (forall d. Data d => d -> u) -> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody -> m SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody -> m SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody -> m SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody #

Show SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Generic SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

ToJSON SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

FromJSON SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

type Rep SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

type Rep SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody = D1 ('MetaData "SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody" "OryKratos.Types.Payload" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody" 'PrefixI 'True) ((S1 ('MetaSel ('Just "csrf_token") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "method") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)) :*: (S1 ('MetaSel ('Just "webauthn_register") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: (S1 ('MetaSel ('Just "webauthn_register_displayname") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "webauthn_remove") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text))))))

data SubmitSelfServiceVerificationFlowBody Source #

nolint:deadcode,unused

Constructors

SubmitSelfServiceVerificationFlowBody 

Fields

  • csrf_token :: Maybe Text

    Sending the anti-csrf token is only required for browser login flows.

  • email :: Text

    Email to Verify Needs to be set when initiating the flow. If the email is a registered verification email, a verification link will be sent. If the email is not known, a email with details on what happened will be sent instead. format: email

  • method :: Text

    Method supports $sel:link:SubmitSelfServiceSettingsFlowBody only right now.

Instances

Instances details
Eq SubmitSelfServiceVerificationFlowBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Data SubmitSelfServiceVerificationFlowBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SubmitSelfServiceVerificationFlowBody -> c SubmitSelfServiceVerificationFlowBody #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SubmitSelfServiceVerificationFlowBody #

toConstr :: SubmitSelfServiceVerificationFlowBody -> Constr #

dataTypeOf :: SubmitSelfServiceVerificationFlowBody -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SubmitSelfServiceVerificationFlowBody) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SubmitSelfServiceVerificationFlowBody) #

gmapT :: (forall b. Data b => b -> b) -> SubmitSelfServiceVerificationFlowBody -> SubmitSelfServiceVerificationFlowBody #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceVerificationFlowBody -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceVerificationFlowBody -> r #

gmapQ :: (forall d. Data d => d -> u) -> SubmitSelfServiceVerificationFlowBody -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SubmitSelfServiceVerificationFlowBody -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SubmitSelfServiceVerificationFlowBody -> m SubmitSelfServiceVerificationFlowBody #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceVerificationFlowBody -> m SubmitSelfServiceVerificationFlowBody #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceVerificationFlowBody -> m SubmitSelfServiceVerificationFlowBody #

Show SubmitSelfServiceVerificationFlowBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Generic SubmitSelfServiceVerificationFlowBody Source # 
Instance details

Defined in OryKratos.Types.Payload

ToJSON SubmitSelfServiceVerificationFlowBody Source # 
Instance details

Defined in OryKratos.Types.Payload

FromJSON SubmitSelfServiceVerificationFlowBody Source # 
Instance details

Defined in OryKratos.Types.Payload

type Rep SubmitSelfServiceVerificationFlowBody Source # 
Instance details

Defined in OryKratos.Types.Payload

type Rep SubmitSelfServiceVerificationFlowBody = D1 ('MetaData "SubmitSelfServiceVerificationFlowBody" "OryKratos.Types.Payload" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "SubmitSelfServiceVerificationFlowBody" 'PrefixI 'True) (S1 ('MetaSel ('Just "csrf_token") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: (S1 ('MetaSel ('Just "email") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "method") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text))))

data SubmitSelfServiceVerificationFlowWithLinkMethodBody Source #

Constructors

SubmitSelfServiceVerificationFlowWithLinkMethodBody 

Fields

  • csrf_token :: Maybe Text

    Sending the anti-csrf token is only required for browser login flows.

  • email :: Text

    Email to Verify Needs to be set when initiating the flow. If the email is a registered verification email, a verification link will be sent. If the email is not known, a email with details on what happened will be sent instead. format: email

  • method :: Text

    Method supports $sel:link:SubmitSelfServiceSettingsFlowBody only right now.

Instances

Instances details
Eq SubmitSelfServiceVerificationFlowWithLinkMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Data SubmitSelfServiceVerificationFlowWithLinkMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SubmitSelfServiceVerificationFlowWithLinkMethodBody -> c SubmitSelfServiceVerificationFlowWithLinkMethodBody #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SubmitSelfServiceVerificationFlowWithLinkMethodBody #

toConstr :: SubmitSelfServiceVerificationFlowWithLinkMethodBody -> Constr #

dataTypeOf :: SubmitSelfServiceVerificationFlowWithLinkMethodBody -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SubmitSelfServiceVerificationFlowWithLinkMethodBody) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SubmitSelfServiceVerificationFlowWithLinkMethodBody) #

gmapT :: (forall b. Data b => b -> b) -> SubmitSelfServiceVerificationFlowWithLinkMethodBody -> SubmitSelfServiceVerificationFlowWithLinkMethodBody #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceVerificationFlowWithLinkMethodBody -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceVerificationFlowWithLinkMethodBody -> r #

gmapQ :: (forall d. Data d => d -> u) -> SubmitSelfServiceVerificationFlowWithLinkMethodBody -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SubmitSelfServiceVerificationFlowWithLinkMethodBody -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SubmitSelfServiceVerificationFlowWithLinkMethodBody -> m SubmitSelfServiceVerificationFlowWithLinkMethodBody #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceVerificationFlowWithLinkMethodBody -> m SubmitSelfServiceVerificationFlowWithLinkMethodBody #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceVerificationFlowWithLinkMethodBody -> m SubmitSelfServiceVerificationFlowWithLinkMethodBody #

Show SubmitSelfServiceVerificationFlowWithLinkMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

Generic SubmitSelfServiceVerificationFlowWithLinkMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

ToJSON SubmitSelfServiceVerificationFlowWithLinkMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

FromJSON SubmitSelfServiceVerificationFlowWithLinkMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

type Rep SubmitSelfServiceVerificationFlowWithLinkMethodBody Source # 
Instance details

Defined in OryKratos.Types.Payload

type Rep SubmitSelfServiceVerificationFlowWithLinkMethodBody = D1 ('MetaData "SubmitSelfServiceVerificationFlowWithLinkMethodBody" "OryKratos.Types.Payload" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "SubmitSelfServiceVerificationFlowWithLinkMethodBody" 'PrefixI 'True) (S1 ('MetaSel ('Just "csrf_token") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: (S1 ('MetaSel ('Just "email") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "method") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text))))

data SelfServiceBrowserLocationChangeRequiredError Source #

Constructors

SelfServiceBrowserLocationChangeRequiredError 

Fields

Instances

Instances details
Eq SelfServiceBrowserLocationChangeRequiredError Source # 
Instance details

Defined in OryKratos.Types.SelfService

Data SelfServiceBrowserLocationChangeRequiredError Source # 
Instance details

Defined in OryKratos.Types.SelfService

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SelfServiceBrowserLocationChangeRequiredError -> c SelfServiceBrowserLocationChangeRequiredError #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SelfServiceBrowserLocationChangeRequiredError #

toConstr :: SelfServiceBrowserLocationChangeRequiredError -> Constr #

dataTypeOf :: SelfServiceBrowserLocationChangeRequiredError -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SelfServiceBrowserLocationChangeRequiredError) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SelfServiceBrowserLocationChangeRequiredError) #

gmapT :: (forall b. Data b => b -> b) -> SelfServiceBrowserLocationChangeRequiredError -> SelfServiceBrowserLocationChangeRequiredError #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SelfServiceBrowserLocationChangeRequiredError -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SelfServiceBrowserLocationChangeRequiredError -> r #

gmapQ :: (forall d. Data d => d -> u) -> SelfServiceBrowserLocationChangeRequiredError -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SelfServiceBrowserLocationChangeRequiredError -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SelfServiceBrowserLocationChangeRequiredError -> m SelfServiceBrowserLocationChangeRequiredError #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SelfServiceBrowserLocationChangeRequiredError -> m SelfServiceBrowserLocationChangeRequiredError #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SelfServiceBrowserLocationChangeRequiredError -> m SelfServiceBrowserLocationChangeRequiredError #

Show SelfServiceBrowserLocationChangeRequiredError Source # 
Instance details

Defined in OryKratos.Types.SelfService

Generic SelfServiceBrowserLocationChangeRequiredError Source # 
Instance details

Defined in OryKratos.Types.SelfService

ToJSON SelfServiceBrowserLocationChangeRequiredError Source # 
Instance details

Defined in OryKratos.Types.SelfService

FromJSON SelfServiceBrowserLocationChangeRequiredError Source # 
Instance details

Defined in OryKratos.Types.SelfService

type Rep SelfServiceBrowserLocationChangeRequiredError Source # 
Instance details

Defined in OryKratos.Types.SelfService

data SelfServiceError Source #

Constructors

SelfServiceError 

Fields

Instances

Instances details
Eq SelfServiceError Source # 
Instance details

Defined in OryKratos.Types.SelfService

Data SelfServiceError Source # 
Instance details

Defined in OryKratos.Types.SelfService

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SelfServiceError -> c SelfServiceError #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SelfServiceError #

toConstr :: SelfServiceError -> Constr #

dataTypeOf :: SelfServiceError -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SelfServiceError) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SelfServiceError) #

gmapT :: (forall b. Data b => b -> b) -> SelfServiceError -> SelfServiceError #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SelfServiceError -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SelfServiceError -> r #

gmapQ :: (forall d. Data d => d -> u) -> SelfServiceError -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SelfServiceError -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SelfServiceError -> m SelfServiceError #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SelfServiceError -> m SelfServiceError #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SelfServiceError -> m SelfServiceError #

Show SelfServiceError Source # 
Instance details

Defined in OryKratos.Types.SelfService

Generic SelfServiceError Source # 
Instance details

Defined in OryKratos.Types.SelfService

Associated Types

type Rep SelfServiceError :: Type -> Type #

ToJSON SelfServiceError Source # 
Instance details

Defined in OryKratos.Types.SelfService

FromJSON SelfServiceError Source # 
Instance details

Defined in OryKratos.Types.SelfService

type Rep SelfServiceError Source # 
Instance details

Defined in OryKratos.Types.SelfService

type Rep SelfServiceError = D1 ('MetaData "SelfServiceError" "OryKratos.Types.SelfService" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "SelfServiceError" 'PrefixI 'True) ((S1 ('MetaSel ('Just "created_at") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe UTCTime)) :*: S1 ('MetaSel ('Just "error") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Value))) :*: (S1 ('MetaSel ('Just "id") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UUID) :*: S1 ('MetaSel ('Just "updated_at") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe UTCTime)))))

data SelfServiceFlowExpiredError Source #

Is sent when a flow is expired

Constructors

SelfServiceFlowExpiredError 

Fields

  • code :: Maybe Integer

    The status code

  • debug :: Maybe Text

    Debug information This field is often not exposed to protect against leaking sensitive information.

  • details :: Maybe (Map String Value)

    Further error details

  • id :: Maybe Text

    The error ID Useful when trying to identify various errors in application logic.

  • message :: Text

    Error message The error's message.

  • reason :: Maybe Text

    A human-readable reason for the error

  • request :: Maybe Text

    The request ID The request ID is often exposed internally in order to trace errors across service architectures. This is often a UUID.

  • since :: Maybe Integer

    A Duration represents the elapsed time between two instants as an int64 nanosecond count. The representation limits the largest representable duration to approximately 290 years.

  • status :: Maybe Text

    The status description

  • use_flow_id :: Maybe UUID
     

Instances

Instances details
Eq SelfServiceFlowExpiredError Source # 
Instance details

Defined in OryKratos.Types.SelfService

Data SelfServiceFlowExpiredError Source # 
Instance details

Defined in OryKratos.Types.SelfService

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SelfServiceFlowExpiredError -> c SelfServiceFlowExpiredError #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SelfServiceFlowExpiredError #

toConstr :: SelfServiceFlowExpiredError -> Constr #

dataTypeOf :: SelfServiceFlowExpiredError -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SelfServiceFlowExpiredError) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SelfServiceFlowExpiredError) #

gmapT :: (forall b. Data b => b -> b) -> SelfServiceFlowExpiredError -> SelfServiceFlowExpiredError #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SelfServiceFlowExpiredError -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SelfServiceFlowExpiredError -> r #

gmapQ :: (forall d. Data d => d -> u) -> SelfServiceFlowExpiredError -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SelfServiceFlowExpiredError -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SelfServiceFlowExpiredError -> m SelfServiceFlowExpiredError #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SelfServiceFlowExpiredError -> m SelfServiceFlowExpiredError #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SelfServiceFlowExpiredError -> m SelfServiceFlowExpiredError #

Show SelfServiceFlowExpiredError Source # 
Instance details

Defined in OryKratos.Types.SelfService

Generic SelfServiceFlowExpiredError Source # 
Instance details

Defined in OryKratos.Types.SelfService

Associated Types

type Rep SelfServiceFlowExpiredError :: Type -> Type #

ToJSON SelfServiceFlowExpiredError Source # 
Instance details

Defined in OryKratos.Types.SelfService

FromJSON SelfServiceFlowExpiredError Source # 
Instance details

Defined in OryKratos.Types.SelfService

type Rep SelfServiceFlowExpiredError Source # 
Instance details

Defined in OryKratos.Types.SelfService

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

Instances details
Eq SelfServiceLoginFlow Source # 
Instance details

Defined in OryKratos.Types.SelfService

Data SelfServiceLoginFlow Source # 
Instance details

Defined in OryKratos.Types.SelfService

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SelfServiceLoginFlow -> c SelfServiceLoginFlow #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SelfServiceLoginFlow #

toConstr :: SelfServiceLoginFlow -> Constr #

dataTypeOf :: SelfServiceLoginFlow -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SelfServiceLoginFlow) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SelfServiceLoginFlow) #

gmapT :: (forall b. Data b => b -> b) -> SelfServiceLoginFlow -> SelfServiceLoginFlow #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SelfServiceLoginFlow -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SelfServiceLoginFlow -> r #

gmapQ :: (forall d. Data d => d -> u) -> SelfServiceLoginFlow -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SelfServiceLoginFlow -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SelfServiceLoginFlow -> m SelfServiceLoginFlow #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SelfServiceLoginFlow -> m SelfServiceLoginFlow #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SelfServiceLoginFlow -> m SelfServiceLoginFlow #

Show SelfServiceLoginFlow Source # 
Instance details

Defined in OryKratos.Types.SelfService

Generic SelfServiceLoginFlow Source # 
Instance details

Defined in OryKratos.Types.SelfService

Associated Types

type Rep SelfServiceLoginFlow :: Type -> Type #

ToJSON SelfServiceLoginFlow Source # 
Instance details

Defined in OryKratos.Types.SelfService

FromJSON SelfServiceLoginFlow Source # 
Instance details

Defined in OryKratos.Types.SelfService

type Rep SelfServiceLoginFlow Source # 
Instance details

Defined in OryKratos.Types.SelfService

type Rep SelfServiceLoginFlow = D1 ('MetaData "SelfServiceLoginFlow" "OryKratos.Types.SelfService" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "SelfServiceLoginFlow" 'PrefixI 'True) (((S1 ('MetaSel ('Just "active") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe IdentityCredentialsType)) :*: (S1 ('MetaSel ('Just "created_at") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe UTCTime)) :*: S1 ('MetaSel ('Just "expires_at") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UTCTime))) :*: (S1 ('MetaSel ('Just "id") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UUID) :*: (S1 ('MetaSel ('Just "issued_at") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UTCTime) :*: S1 ('MetaSel ('Just "refresh") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool))))) :*: ((S1 ('MetaSel ('Just "request_url") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: (S1 ('MetaSel ('Just "requested_aal") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe AuthenticatorAssuranceLevel)) :*: S1 ('MetaSel ('Just "return_to") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)))) :*: (S1 ('MetaSel ('Just "_type") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: (S1 ('MetaSel ('Just "ui") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UiContainer) :*: S1 ('MetaSel ('Just "updated_at") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe UTCTime)))))))

data SelfServiceLogoutUrl Source #

Constructors

SelfServiceLogoutUrl 

Fields

  • logout_token :: Text

    LogoutToken can be used to perform logout using AJAX.

  • logout_url :: Text

    LogoutURL can be opened in a browser to sign the user out. format: uri

Instances

Instances details
Eq SelfServiceLogoutUrl Source # 
Instance details

Defined in OryKratos.Types.SelfService

Data SelfServiceLogoutUrl Source # 
Instance details

Defined in OryKratos.Types.SelfService

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SelfServiceLogoutUrl -> c SelfServiceLogoutUrl #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SelfServiceLogoutUrl #

toConstr :: SelfServiceLogoutUrl -> Constr #

dataTypeOf :: SelfServiceLogoutUrl -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SelfServiceLogoutUrl) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SelfServiceLogoutUrl) #

gmapT :: (forall b. Data b => b -> b) -> SelfServiceLogoutUrl -> SelfServiceLogoutUrl #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SelfServiceLogoutUrl -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SelfServiceLogoutUrl -> r #

gmapQ :: (forall d. Data d => d -> u) -> SelfServiceLogoutUrl -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SelfServiceLogoutUrl -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SelfServiceLogoutUrl -> m SelfServiceLogoutUrl #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SelfServiceLogoutUrl -> m SelfServiceLogoutUrl #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SelfServiceLogoutUrl -> m SelfServiceLogoutUrl #

Show SelfServiceLogoutUrl Source # 
Instance details

Defined in OryKratos.Types.SelfService

Generic SelfServiceLogoutUrl Source # 
Instance details

Defined in OryKratos.Types.SelfService

Associated Types

type Rep SelfServiceLogoutUrl :: Type -> Type #

ToJSON SelfServiceLogoutUrl Source # 
Instance details

Defined in OryKratos.Types.SelfService

FromJSON SelfServiceLogoutUrl Source # 
Instance details

Defined in OryKratos.Types.SelfService

type Rep SelfServiceLogoutUrl Source # 
Instance details

Defined in OryKratos.Types.SelfService

type Rep SelfServiceLogoutUrl = D1 ('MetaData "SelfServiceLogoutUrl" "OryKratos.Types.SelfService" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "SelfServiceLogoutUrl" 'PrefixI 'True) (S1 ('MetaSel ('Just "logout_token") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "logout_url") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

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

  • active :: Maybe Text

    Active, if set, contains the registration method that is being used. It is initially not set.

  • expires_at :: UTCTime

    ExpiresAt is the time (UTC) when the request expires. If the user still wishes to update the setting, a new request has to be initiated.

  • id :: UUID
     
  • issued_at :: UTCTime

    IssuedAt is the time (UTC) when the request occurred.

  • request_url :: Text

    RequestURL is the initial URL that was requested from Ory Kratos. It can be used to forward information contained in the URL's path or query for example.

  • return_to :: Maybe Text

    ReturnTo contains the requested return_to URL.

  • state :: SelfServiceRecoveryFlowState
     
  • _type :: Text

    The flow type can either be api or browser.

  • ui :: UiContainer
     

Instances

Instances details
Eq SelfServiceRecoveryFlow Source # 
Instance details

Defined in OryKratos.Types.SelfService

Data SelfServiceRecoveryFlow Source # 
Instance details

Defined in OryKratos.Types.SelfService

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SelfServiceRecoveryFlow -> c SelfServiceRecoveryFlow #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SelfServiceRecoveryFlow #

toConstr :: SelfServiceRecoveryFlow -> Constr #

dataTypeOf :: SelfServiceRecoveryFlow -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SelfServiceRecoveryFlow) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SelfServiceRecoveryFlow) #

gmapT :: (forall b. Data b => b -> b) -> SelfServiceRecoveryFlow -> SelfServiceRecoveryFlow #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SelfServiceRecoveryFlow -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SelfServiceRecoveryFlow -> r #

gmapQ :: (forall d. Data d => d -> u) -> SelfServiceRecoveryFlow -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SelfServiceRecoveryFlow -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SelfServiceRecoveryFlow -> m SelfServiceRecoveryFlow #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SelfServiceRecoveryFlow -> m SelfServiceRecoveryFlow #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SelfServiceRecoveryFlow -> m SelfServiceRecoveryFlow #

Show SelfServiceRecoveryFlow Source # 
Instance details

Defined in OryKratos.Types.SelfService

Generic SelfServiceRecoveryFlow Source # 
Instance details

Defined in OryKratos.Types.SelfService

Associated Types

type Rep SelfServiceRecoveryFlow :: Type -> Type #

ToJSON SelfServiceRecoveryFlow Source # 
Instance details

Defined in OryKratos.Types.SelfService

FromJSON SelfServiceRecoveryFlow Source # 
Instance details

Defined in OryKratos.Types.SelfService

type Rep SelfServiceRecoveryFlow Source # 
Instance details

Defined in OryKratos.Types.SelfService

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.

Instances

Instances details
Eq SelfServiceRecoveryFlowState Source # 
Instance details

Defined in OryKratos.Types.SelfService

Data SelfServiceRecoveryFlowState Source # 
Instance details

Defined in OryKratos.Types.SelfService

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SelfServiceRecoveryFlowState -> c SelfServiceRecoveryFlowState #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SelfServiceRecoveryFlowState #

toConstr :: SelfServiceRecoveryFlowState -> Constr #

dataTypeOf :: SelfServiceRecoveryFlowState -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SelfServiceRecoveryFlowState) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SelfServiceRecoveryFlowState) #

gmapT :: (forall b. Data b => b -> b) -> SelfServiceRecoveryFlowState -> SelfServiceRecoveryFlowState #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SelfServiceRecoveryFlowState -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SelfServiceRecoveryFlowState -> r #

gmapQ :: (forall d. Data d => d -> u) -> SelfServiceRecoveryFlowState -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SelfServiceRecoveryFlowState -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SelfServiceRecoveryFlowState -> m SelfServiceRecoveryFlowState #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SelfServiceRecoveryFlowState -> m SelfServiceRecoveryFlowState #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SelfServiceRecoveryFlowState -> m SelfServiceRecoveryFlowState #

Show SelfServiceRecoveryFlowState Source # 
Instance details

Defined in OryKratos.Types.SelfService

Generic SelfServiceRecoveryFlowState Source # 
Instance details

Defined in OryKratos.Types.SelfService

Associated Types

type Rep SelfServiceRecoveryFlowState :: Type -> Type #

ToJSON SelfServiceRecoveryFlowState Source # 
Instance details

Defined in OryKratos.Types.SelfService

FromJSON SelfServiceRecoveryFlowState Source # 
Instance details

Defined in OryKratos.Types.SelfService

type Rep SelfServiceRecoveryFlowState Source # 
Instance details

Defined in OryKratos.Types.SelfService

type Rep SelfServiceRecoveryFlowState = D1 ('MetaData "SelfServiceRecoveryFlowState" "OryKratos.Types.SelfService" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "SelfServiceRecoveryFlowStateChooseMethod" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "SelfServiceRecoveryFlowStateSentEmail" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "SelfServiceRecoveryFlowStatePassedChallenge" 'PrefixI 'False) (U1 :: Type -> Type)))

data SelfServiceRecoveryLink Source #

Constructors

SelfServiceRecoveryLink 

Fields

Instances

data SelfServiceRegistrationFlow Source #

Constructors

SelfServiceRegistrationFlow 

Fields

Instances

Instances details
Eq SelfServiceRegistrationFlow Source # 
Instance details

Defined in OryKratos.Types.SelfService

Data SelfServiceRegistrationFlow Source # 
Instance details

Defined in OryKratos.Types.SelfService

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SelfServiceRegistrationFlow -> c SelfServiceRegistrationFlow #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SelfServiceRegistrationFlow #

toConstr :: SelfServiceRegistrationFlow -> Constr #

dataTypeOf :: SelfServiceRegistrationFlow -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SelfServiceRegistrationFlow) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SelfServiceRegistrationFlow) #

gmapT :: (forall b. Data b => b -> b) -> SelfServiceRegistrationFlow -> SelfServiceRegistrationFlow #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SelfServiceRegistrationFlow -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SelfServiceRegistrationFlow -> r #

gmapQ :: (forall d. Data d => d -> u) -> SelfServiceRegistrationFlow -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SelfServiceRegistrationFlow -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SelfServiceRegistrationFlow -> m SelfServiceRegistrationFlow #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SelfServiceRegistrationFlow -> m SelfServiceRegistrationFlow #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SelfServiceRegistrationFlow -> m SelfServiceRegistrationFlow #

Show SelfServiceRegistrationFlow Source # 
Instance details

Defined in OryKratos.Types.SelfService

Generic SelfServiceRegistrationFlow Source # 
Instance details

Defined in OryKratos.Types.SelfService

Associated Types

type Rep SelfServiceRegistrationFlow :: Type -> Type #

ToJSON SelfServiceRegistrationFlow Source # 
Instance details

Defined in OryKratos.Types.SelfService

FromJSON SelfServiceRegistrationFlow Source # 
Instance details

Defined in OryKratos.Types.SelfService

type Rep SelfServiceRegistrationFlow Source # 
Instance details

Defined in OryKratos.Types.SelfService

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

Instances details
(Eq metadataAdmin, Eq metadataPublic, Eq traits) => Eq (SelfServiceSettingsFlow traits metadataAdmin metadataPublic) Source # 
Instance details

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 # 
Instance details

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 # 
Instance details

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 # 
Instance details

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 # 
Instance details

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 # 
Instance details

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 # 
Instance details

Defined in OryKratos.Types.SelfService

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

Instances details
Eq SelfServiceSettingsFlowState Source # 
Instance details

Defined in OryKratos.Types.SelfService

Data SelfServiceSettingsFlowState Source # 
Instance details

Defined in OryKratos.Types.SelfService

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SelfServiceSettingsFlowState -> c SelfServiceSettingsFlowState #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SelfServiceSettingsFlowState #

toConstr :: SelfServiceSettingsFlowState -> Constr #

dataTypeOf :: SelfServiceSettingsFlowState -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SelfServiceSettingsFlowState) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SelfServiceSettingsFlowState) #

gmapT :: (forall b. Data b => b -> b) -> SelfServiceSettingsFlowState -> SelfServiceSettingsFlowState #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SelfServiceSettingsFlowState -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SelfServiceSettingsFlowState -> r #

gmapQ :: (forall d. Data d => d -> u) -> SelfServiceSettingsFlowState -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SelfServiceSettingsFlowState -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SelfServiceSettingsFlowState -> m SelfServiceSettingsFlowState #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SelfServiceSettingsFlowState -> m SelfServiceSettingsFlowState #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SelfServiceSettingsFlowState -> m SelfServiceSettingsFlowState #

Show SelfServiceSettingsFlowState Source # 
Instance details

Defined in OryKratos.Types.SelfService

Generic SelfServiceSettingsFlowState Source # 
Instance details

Defined in OryKratos.Types.SelfService

Associated Types

type Rep SelfServiceSettingsFlowState :: Type -> Type #

ToJSON SelfServiceSettingsFlowState Source # 
Instance details

Defined in OryKratos.Types.SelfService

FromJSON SelfServiceSettingsFlowState Source # 
Instance details

Defined in OryKratos.Types.SelfService

type Rep SelfServiceSettingsFlowState Source # 
Instance details

Defined in OryKratos.Types.SelfService

type Rep SelfServiceSettingsFlowState = D1 ('MetaData "SelfServiceSettingsFlowState" "OryKratos.Types.SelfService" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "SelfServiceSettingsFlowStateShowForm" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "SelfServiceSettingsFlowStateSuccess" 'PrefixI 'False) (U1 :: Type -> Type))

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

Instances details
Eq SelfServiceVerificationFlow Source # 
Instance details

Defined in OryKratos.Types.SelfService

Data SelfServiceVerificationFlow Source # 
Instance details

Defined in OryKratos.Types.SelfService

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SelfServiceVerificationFlow -> c SelfServiceVerificationFlow #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SelfServiceVerificationFlow #

toConstr :: SelfServiceVerificationFlow -> Constr #

dataTypeOf :: SelfServiceVerificationFlow -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SelfServiceVerificationFlow) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SelfServiceVerificationFlow) #

gmapT :: (forall b. Data b => b -> b) -> SelfServiceVerificationFlow -> SelfServiceVerificationFlow #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SelfServiceVerificationFlow -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SelfServiceVerificationFlow -> r #

gmapQ :: (forall d. Data d => d -> u) -> SelfServiceVerificationFlow -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SelfServiceVerificationFlow -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SelfServiceVerificationFlow -> m SelfServiceVerificationFlow #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SelfServiceVerificationFlow -> m SelfServiceVerificationFlow #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SelfServiceVerificationFlow -> m SelfServiceVerificationFlow #

Show SelfServiceVerificationFlow Source # 
Instance details

Defined in OryKratos.Types.SelfService

Generic SelfServiceVerificationFlow Source # 
Instance details

Defined in OryKratos.Types.SelfService

Associated Types

type Rep SelfServiceVerificationFlow :: Type -> Type #

ToJSON SelfServiceVerificationFlow Source # 
Instance details

Defined in OryKratos.Types.SelfService

FromJSON SelfServiceVerificationFlow Source # 
Instance details

Defined in OryKratos.Types.SelfService

type Rep SelfServiceVerificationFlow Source # 
Instance details

Defined in OryKratos.Types.SelfService

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.

Instances

Instances details
Eq SelfServiceVerificationFlowState Source # 
Instance details

Defined in OryKratos.Types.SelfService

Data SelfServiceVerificationFlowState Source # 
Instance details

Defined in OryKratos.Types.SelfService

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SelfServiceVerificationFlowState -> c SelfServiceVerificationFlowState #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SelfServiceVerificationFlowState #

toConstr :: SelfServiceVerificationFlowState -> Constr #

dataTypeOf :: SelfServiceVerificationFlowState -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SelfServiceVerificationFlowState) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SelfServiceVerificationFlowState) #

gmapT :: (forall b. Data b => b -> b) -> SelfServiceVerificationFlowState -> SelfServiceVerificationFlowState #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SelfServiceVerificationFlowState -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SelfServiceVerificationFlowState -> r #

gmapQ :: (forall d. Data d => d -> u) -> SelfServiceVerificationFlowState -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SelfServiceVerificationFlowState -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SelfServiceVerificationFlowState -> m SelfServiceVerificationFlowState #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SelfServiceVerificationFlowState -> m SelfServiceVerificationFlowState #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SelfServiceVerificationFlowState -> m SelfServiceVerificationFlowState #

Show SelfServiceVerificationFlowState Source # 
Instance details

Defined in OryKratos.Types.SelfService

Generic SelfServiceVerificationFlowState Source # 
Instance details

Defined in OryKratos.Types.SelfService

Associated Types

type Rep SelfServiceVerificationFlowState :: Type -> Type #

ToJSON SelfServiceVerificationFlowState Source # 
Instance details

Defined in OryKratos.Types.SelfService

FromJSON SelfServiceVerificationFlowState Source # 
Instance details

Defined in OryKratos.Types.SelfService

type Rep SelfServiceVerificationFlowState Source # 
Instance details

Defined in OryKratos.Types.SelfService

type Rep SelfServiceVerificationFlowState = D1 ('MetaData "SelfServiceVerificationFlowState" "OryKratos.Types.SelfService" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "SelfServiceVerificationFlowStateChooseMethod" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "SelfServiceVerificationFlowStateSentEmail" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "SelfServiceVerificationFlowStatePassedChallenge" 'PrefixI 'False) (U1 :: Type -> Type)))

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

Instances

Instances details
Eq AuthenticatorAssuranceLevel Source # 
Instance details

Defined in OryKratos.Types.Types

Data AuthenticatorAssuranceLevel Source # 
Instance details

Defined in OryKratos.Types.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AuthenticatorAssuranceLevel -> c AuthenticatorAssuranceLevel #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AuthenticatorAssuranceLevel #

toConstr :: AuthenticatorAssuranceLevel -> Constr #

dataTypeOf :: AuthenticatorAssuranceLevel -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AuthenticatorAssuranceLevel) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AuthenticatorAssuranceLevel) #

gmapT :: (forall b. Data b => b -> b) -> AuthenticatorAssuranceLevel -> AuthenticatorAssuranceLevel #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AuthenticatorAssuranceLevel -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AuthenticatorAssuranceLevel -> r #

gmapQ :: (forall d. Data d => d -> u) -> AuthenticatorAssuranceLevel -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AuthenticatorAssuranceLevel -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AuthenticatorAssuranceLevel -> m AuthenticatorAssuranceLevel #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AuthenticatorAssuranceLevel -> m AuthenticatorAssuranceLevel #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AuthenticatorAssuranceLevel -> m AuthenticatorAssuranceLevel #

Show AuthenticatorAssuranceLevel Source # 
Instance details

Defined in OryKratos.Types.Types

Generic AuthenticatorAssuranceLevel Source # 
Instance details

Defined in OryKratos.Types.Types

Associated Types

type Rep AuthenticatorAssuranceLevel :: Type -> Type #

ToJSON AuthenticatorAssuranceLevel Source # 
Instance details

Defined in OryKratos.Types.Types

FromJSON AuthenticatorAssuranceLevel Source # 
Instance details

Defined in OryKratos.Types.Types

type Rep AuthenticatorAssuranceLevel Source # 
Instance details

Defined in OryKratos.Types.Types

type Rep AuthenticatorAssuranceLevel = D1 ('MetaData "AuthenticatorAssuranceLevel" "OryKratos.Types.Types" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) ((C1 ('MetaCons "AuthenticatorAssuranceLevel0" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "AuthenticatorAssuranceLevel1" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "AuthenticatorAssuranceLevel2" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "AuthenticatorAssuranceLevel3" 'PrefixI 'False) (U1 :: Type -> Type)))

data ErrorAuthenticatorAssuranceLevelNotSatisfied Source #

Constructors

ErrorAuthenticatorAssuranceLevelNotSatisfied 

Fields

Instances

Instances details
Eq ErrorAuthenticatorAssuranceLevelNotSatisfied Source # 
Instance details

Defined in OryKratos.Types.Types

Data ErrorAuthenticatorAssuranceLevelNotSatisfied Source # 
Instance details

Defined in OryKratos.Types.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ErrorAuthenticatorAssuranceLevelNotSatisfied -> c ErrorAuthenticatorAssuranceLevelNotSatisfied #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ErrorAuthenticatorAssuranceLevelNotSatisfied #

toConstr :: ErrorAuthenticatorAssuranceLevelNotSatisfied -> Constr #

dataTypeOf :: ErrorAuthenticatorAssuranceLevelNotSatisfied -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ErrorAuthenticatorAssuranceLevelNotSatisfied) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ErrorAuthenticatorAssuranceLevelNotSatisfied) #

gmapT :: (forall b. Data b => b -> b) -> ErrorAuthenticatorAssuranceLevelNotSatisfied -> ErrorAuthenticatorAssuranceLevelNotSatisfied #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ErrorAuthenticatorAssuranceLevelNotSatisfied -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ErrorAuthenticatorAssuranceLevelNotSatisfied -> r #

gmapQ :: (forall d. Data d => d -> u) -> ErrorAuthenticatorAssuranceLevelNotSatisfied -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ErrorAuthenticatorAssuranceLevelNotSatisfied -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ErrorAuthenticatorAssuranceLevelNotSatisfied -> m ErrorAuthenticatorAssuranceLevelNotSatisfied #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ErrorAuthenticatorAssuranceLevelNotSatisfied -> m ErrorAuthenticatorAssuranceLevelNotSatisfied #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ErrorAuthenticatorAssuranceLevelNotSatisfied -> m ErrorAuthenticatorAssuranceLevelNotSatisfied #

Show ErrorAuthenticatorAssuranceLevelNotSatisfied Source # 
Instance details

Defined in OryKratos.Types.Types

Generic ErrorAuthenticatorAssuranceLevelNotSatisfied Source # 
Instance details

Defined in OryKratos.Types.Types

ToJSON ErrorAuthenticatorAssuranceLevelNotSatisfied Source # 
Instance details

Defined in OryKratos.Types.Types

FromJSON ErrorAuthenticatorAssuranceLevelNotSatisfied Source # 
Instance details

Defined in OryKratos.Types.Types

type Rep ErrorAuthenticatorAssuranceLevelNotSatisfied Source # 
Instance details

Defined in OryKratos.Types.Types

data GenericError Source #

Constructors

GenericError 

Fields

Instances

Instances details
Eq GenericError Source # 
Instance details

Defined in OryKratos.Types.Types

Data GenericError Source # 
Instance details

Defined in OryKratos.Types.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GenericError -> c GenericError #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c GenericError #

toConstr :: GenericError -> Constr #

dataTypeOf :: GenericError -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c GenericError) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c GenericError) #

gmapT :: (forall b. Data b => b -> b) -> GenericError -> GenericError #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GenericError -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GenericError -> r #

gmapQ :: (forall d. Data d => d -> u) -> GenericError -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GenericError -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GenericError -> m GenericError #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GenericError -> m GenericError #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GenericError -> m GenericError #

Show GenericError Source # 
Instance details

Defined in OryKratos.Types.Types

Generic GenericError Source # 
Instance details

Defined in OryKratos.Types.Types

Associated Types

type Rep GenericError :: Type -> Type #

ToJSON GenericError Source # 
Instance details

Defined in OryKratos.Types.Types

FromJSON GenericError Source # 
Instance details

Defined in OryKratos.Types.Types

type Rep GenericError Source # 
Instance details

Defined in OryKratos.Types.Types

type Rep GenericError = D1 ('MetaData "GenericError" "OryKratos.Types.Types" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "GenericError" 'PrefixI 'True) (((S1 ('MetaSel ('Just "genericErrorCode") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Integer)) :*: S1 ('MetaSel ('Just "genericErrorDebug") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text))) :*: (S1 ('MetaSel ('Just "genericErrorDetails") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Value)) :*: S1 ('MetaSel ('Just "genericErrorId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)))) :*: ((S1 ('MetaSel ('Just "genericErrorMessage") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "genericErrorReason") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text))) :*: (S1 ('MetaSel ('Just "genericErrorRequest") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "genericErrorStatus") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text))))))

data GetVersion200Response Source #

Constructors

GetVersion200Response 

Fields

Instances

Instances details
Eq GetVersion200Response Source # 
Instance details

Defined in OryKratos.Types.Types

Data GetVersion200Response Source # 
Instance details

Defined in OryKratos.Types.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GetVersion200Response -> c GetVersion200Response #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c GetVersion200Response #

toConstr :: GetVersion200Response -> Constr #

dataTypeOf :: GetVersion200Response -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c GetVersion200Response) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c GetVersion200Response) #

gmapT :: (forall b. Data b => b -> b) -> GetVersion200Response -> GetVersion200Response #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GetVersion200Response -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GetVersion200Response -> r #

gmapQ :: (forall d. Data d => d -> u) -> GetVersion200Response -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GetVersion200Response -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GetVersion200Response -> m GetVersion200Response #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GetVersion200Response -> m GetVersion200Response #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GetVersion200Response -> m GetVersion200Response #

Show GetVersion200Response Source # 
Instance details

Defined in OryKratos.Types.Types

Generic GetVersion200Response Source # 
Instance details

Defined in OryKratos.Types.Types

Associated Types

type Rep GetVersion200Response :: Type -> Type #

ToJSON GetVersion200Response Source # 
Instance details

Defined in OryKratos.Types.Types

FromJSON GetVersion200Response Source # 
Instance details

Defined in OryKratos.Types.Types

type Rep GetVersion200Response Source # 
Instance details

Defined in OryKratos.Types.Types

type Rep GetVersion200Response = D1 ('MetaData "GetVersion200Response" "OryKratos.Types.Types" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "GetVersion200Response" 'PrefixI 'True) (S1 ('MetaSel ('Just "getVersion200ResponseVersion") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

data HealthNotReadyStatus Source #

Constructors

HealthNotReadyStatus 

Fields

Instances

Instances details
Eq HealthNotReadyStatus Source # 
Instance details

Defined in OryKratos.Types.Types

Data HealthNotReadyStatus Source # 
Instance details

Defined in OryKratos.Types.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> HealthNotReadyStatus -> c HealthNotReadyStatus #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c HealthNotReadyStatus #

toConstr :: HealthNotReadyStatus -> Constr #

dataTypeOf :: HealthNotReadyStatus -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c HealthNotReadyStatus) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c HealthNotReadyStatus) #

gmapT :: (forall b. Data b => b -> b) -> HealthNotReadyStatus -> HealthNotReadyStatus #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HealthNotReadyStatus -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HealthNotReadyStatus -> r #

gmapQ :: (forall d. Data d => d -> u) -> HealthNotReadyStatus -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> HealthNotReadyStatus -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> HealthNotReadyStatus -> m HealthNotReadyStatus #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HealthNotReadyStatus -> m HealthNotReadyStatus #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HealthNotReadyStatus -> m HealthNotReadyStatus #

Show HealthNotReadyStatus Source # 
Instance details

Defined in OryKratos.Types.Types

Generic HealthNotReadyStatus Source # 
Instance details

Defined in OryKratos.Types.Types

Associated Types

type Rep HealthNotReadyStatus :: Type -> Type #

ToJSON HealthNotReadyStatus Source # 
Instance details

Defined in OryKratos.Types.Types

FromJSON HealthNotReadyStatus Source # 
Instance details

Defined in OryKratos.Types.Types

type Rep HealthNotReadyStatus Source # 
Instance details

Defined in OryKratos.Types.Types

type Rep HealthNotReadyStatus = D1 ('MetaData "HealthNotReadyStatus" "OryKratos.Types.Types" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "HealthNotReadyStatus" 'PrefixI 'True) (S1 ('MetaSel ('Just "healthNotReadyStatusErrors") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (Map String Text)))))

data HealthStatus Source #

Constructors

HealthStatus 

Fields

Instances

Instances details
Eq HealthStatus Source # 
Instance details

Defined in OryKratos.Types.Types

Data HealthStatus Source # 
Instance details

Defined in OryKratos.Types.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> HealthStatus -> c HealthStatus #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c HealthStatus #

toConstr :: HealthStatus -> Constr #

dataTypeOf :: HealthStatus -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c HealthStatus) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c HealthStatus) #

gmapT :: (forall b. Data b => b -> b) -> HealthStatus -> HealthStatus #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HealthStatus -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HealthStatus -> r #

gmapQ :: (forall d. Data d => d -> u) -> HealthStatus -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> HealthStatus -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> HealthStatus -> m HealthStatus #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HealthStatus -> m HealthStatus #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HealthStatus -> m HealthStatus #

Show HealthStatus Source # 
Instance details

Defined in OryKratos.Types.Types

Generic HealthStatus Source # 
Instance details

Defined in OryKratos.Types.Types

Associated Types

type Rep HealthStatus :: Type -> Type #

ToJSON HealthStatus Source # 
Instance details

Defined in OryKratos.Types.Types

FromJSON HealthStatus Source # 
Instance details

Defined in OryKratos.Types.Types

type Rep HealthStatus Source # 
Instance details

Defined in OryKratos.Types.Types

type Rep HealthStatus = D1 ('MetaData "HealthStatus" "OryKratos.Types.Types" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "HealthStatus" 'PrefixI 'True) (S1 ('MetaSel ('Just "healthStatusStatus") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text))))

data IsAlive200Response Source #

Constructors

IsAlive200Response 

Fields

Instances

Instances details
Eq IsAlive200Response Source # 
Instance details

Defined in OryKratos.Types.Types

Data IsAlive200Response Source # 
Instance details

Defined in OryKratos.Types.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IsAlive200Response -> c IsAlive200Response #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IsAlive200Response #

toConstr :: IsAlive200Response -> Constr #

dataTypeOf :: IsAlive200Response -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IsAlive200Response) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IsAlive200Response) #

gmapT :: (forall b. Data b => b -> b) -> IsAlive200Response -> IsAlive200Response #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IsAlive200Response -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IsAlive200Response -> r #

gmapQ :: (forall d. Data d => d -> u) -> IsAlive200Response -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IsAlive200Response -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IsAlive200Response -> m IsAlive200Response #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IsAlive200Response -> m IsAlive200Response #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IsAlive200Response -> m IsAlive200Response #

Show IsAlive200Response Source # 
Instance details

Defined in OryKratos.Types.Types

Generic IsAlive200Response Source # 
Instance details

Defined in OryKratos.Types.Types

Associated Types

type Rep IsAlive200Response :: Type -> Type #

ToJSON IsAlive200Response Source # 
Instance details

Defined in OryKratos.Types.Types

FromJSON IsAlive200Response Source # 
Instance details

Defined in OryKratos.Types.Types

type Rep IsAlive200Response Source # 
Instance details

Defined in OryKratos.Types.Types

type Rep IsAlive200Response = D1 ('MetaData "IsAlive200Response" "OryKratos.Types.Types" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "IsAlive200Response" 'PrefixI 'True) (S1 ('MetaSel ('Just "isAlive200ResponseStatus") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

data IsReady503Response Source #

Constructors

IsReady503Response 

Fields

Instances

Instances details
Eq IsReady503Response Source # 
Instance details

Defined in OryKratos.Types.Types

Data IsReady503Response Source # 
Instance details

Defined in OryKratos.Types.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IsReady503Response -> c IsReady503Response #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IsReady503Response #

toConstr :: IsReady503Response -> Constr #

dataTypeOf :: IsReady503Response -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IsReady503Response) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IsReady503Response) #

gmapT :: (forall b. Data b => b -> b) -> IsReady503Response -> IsReady503Response #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IsReady503Response -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IsReady503Response -> r #

gmapQ :: (forall d. Data d => d -> u) -> IsReady503Response -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IsReady503Response -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IsReady503Response -> m IsReady503Response #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IsReady503Response -> m IsReady503Response #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IsReady503Response -> m IsReady503Response #

Show IsReady503Response Source # 
Instance details

Defined in OryKratos.Types.Types

Generic IsReady503Response Source # 
Instance details

Defined in OryKratos.Types.Types

Associated Types

type Rep IsReady503Response :: Type -> Type #

ToJSON IsReady503Response Source # 
Instance details

Defined in OryKratos.Types.Types

FromJSON IsReady503Response Source # 
Instance details

Defined in OryKratos.Types.Types

type Rep IsReady503Response Source # 
Instance details

Defined in OryKratos.Types.Types

type Rep IsReady503Response = D1 ('MetaData "IsReady503Response" "OryKratos.Types.Types" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "IsReady503Response" 'PrefixI 'True) (S1 ('MetaSel ('Just "isReady503ResponseErrors") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Map String Text))))

data JsonError Source #

The standard Ory JSON API error format.

Constructors

JsonError 

Instances

Instances details
Eq JsonError Source # 
Instance details

Defined in OryKratos.Types.Types

Data JsonError Source # 
Instance details

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 # 
Instance details

Defined in OryKratos.Types.Types

Generic JsonError Source # 
Instance details

Defined in OryKratos.Types.Types

Associated Types

type Rep JsonError :: Type -> Type #

ToJSON JsonError Source # 
Instance details

Defined in OryKratos.Types.Types

FromJSON JsonError Source # 
Instance details

Defined in OryKratos.Types.Types

type Rep JsonError Source # 
Instance details

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

Instances details
Eq NeedsPrivilegedSessionError Source # 
Instance details

Defined in OryKratos.Types.Types

Data NeedsPrivilegedSessionError Source # 
Instance details

Defined in OryKratos.Types.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NeedsPrivilegedSessionError -> c NeedsPrivilegedSessionError #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NeedsPrivilegedSessionError #

toConstr :: NeedsPrivilegedSessionError -> Constr #

dataTypeOf :: NeedsPrivilegedSessionError -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NeedsPrivilegedSessionError) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NeedsPrivilegedSessionError) #

gmapT :: (forall b. Data b => b -> b) -> NeedsPrivilegedSessionError -> NeedsPrivilegedSessionError #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NeedsPrivilegedSessionError -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NeedsPrivilegedSessionError -> r #

gmapQ :: (forall d. Data d => d -> u) -> NeedsPrivilegedSessionError -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> NeedsPrivilegedSessionError -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NeedsPrivilegedSessionError -> m NeedsPrivilegedSessionError #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NeedsPrivilegedSessionError -> m NeedsPrivilegedSessionError #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NeedsPrivilegedSessionError -> m NeedsPrivilegedSessionError #

Show NeedsPrivilegedSessionError Source # 
Instance details

Defined in OryKratos.Types.Types

Generic NeedsPrivilegedSessionError Source # 
Instance details

Defined in OryKratos.Types.Types

Associated Types

type Rep NeedsPrivilegedSessionError :: Type -> Type #

ToJSON NeedsPrivilegedSessionError Source # 
Instance details

Defined in OryKratos.Types.Types

FromJSON NeedsPrivilegedSessionError Source # 
Instance details

Defined in OryKratos.Types.Types

type Rep NeedsPrivilegedSessionError Source # 
Instance details

Defined in OryKratos.Types.Types

data Pagination Source #

Constructors

Pagination 

Fields

Instances

Instances details
Eq Pagination Source # 
Instance details

Defined in OryKratos.Types.Types

Data Pagination Source # 
Instance details

Defined in OryKratos.Types.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Pagination -> c Pagination #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Pagination #

toConstr :: Pagination -> Constr #

dataTypeOf :: Pagination -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Pagination) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Pagination) #

gmapT :: (forall b. Data b => b -> b) -> Pagination -> Pagination #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Pagination -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Pagination -> r #

gmapQ :: (forall d. Data d => d -> u) -> Pagination -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Pagination -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Pagination -> m Pagination #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Pagination -> m Pagination #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Pagination -> m Pagination #

Show Pagination Source # 
Instance details

Defined in OryKratos.Types.Types

Generic Pagination Source # 
Instance details

Defined in OryKratos.Types.Types

Associated Types

type Rep Pagination :: Type -> Type #

ToJSON Pagination Source # 
Instance details

Defined in OryKratos.Types.Types

FromJSON Pagination Source # 
Instance details

Defined in OryKratos.Types.Types

type Rep Pagination Source # 
Instance details

Defined in OryKratos.Types.Types

type Rep Pagination = D1 ('MetaData "Pagination" "OryKratos.Types.Types" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "Pagination" 'PrefixI 'True) (S1 ('MetaSel ('Just "page") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Integer)) :*: S1 ('MetaSel ('Just "per_page") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Integer))))

data RecoveryAddress Source #

Constructors

RecoveryAddress 

Fields

Instances

Instances details
Eq RecoveryAddress Source # 
Instance details

Defined in OryKratos.Types.Types

Data RecoveryAddress Source # 
Instance details

Defined in OryKratos.Types.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RecoveryAddress -> c RecoveryAddress #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RecoveryAddress #

toConstr :: RecoveryAddress -> Constr #

dataTypeOf :: RecoveryAddress -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RecoveryAddress) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RecoveryAddress) #

gmapT :: (forall b. Data b => b -> b) -> RecoveryAddress -> RecoveryAddress #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RecoveryAddress -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RecoveryAddress -> r #

gmapQ :: (forall d. Data d => d -> u) -> RecoveryAddress -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> RecoveryAddress -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RecoveryAddress -> m RecoveryAddress #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RecoveryAddress -> m RecoveryAddress #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RecoveryAddress -> m RecoveryAddress #

Show RecoveryAddress Source # 
Instance details

Defined in OryKratos.Types.Types

Generic RecoveryAddress Source # 
Instance details

Defined in OryKratos.Types.Types

Associated Types

type Rep RecoveryAddress :: Type -> Type #

ToJSON RecoveryAddress Source # 
Instance details

Defined in OryKratos.Types.Types

FromJSON RecoveryAddress Source # 
Instance details

Defined in OryKratos.Types.Types

type Rep RecoveryAddress Source # 
Instance details

Defined in OryKratos.Types.Types

type Rep RecoveryAddress = D1 ('MetaData "RecoveryAddress" "OryKratos.Types.Types" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "RecoveryAddress" 'PrefixI 'True) ((S1 ('MetaSel ('Just "created_at") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe UTCTime)) :*: S1 ('MetaSel ('Just "id") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UUID)) :*: (S1 ('MetaSel ('Just "updated_at") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe UTCTime)) :*: (S1 ('MetaSel ('Just "value") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "via") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))))

data RevokedSessions Source #

Constructors

RevokedSessions 

Fields

Instances

Instances details
Eq RevokedSessions Source # 
Instance details

Defined in OryKratos.Types.Types

Data RevokedSessions Source # 
Instance details

Defined in OryKratos.Types.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RevokedSessions -> c RevokedSessions #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RevokedSessions #

toConstr :: RevokedSessions -> Constr #

dataTypeOf :: RevokedSessions -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RevokedSessions) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RevokedSessions) #

gmapT :: (forall b. Data b => b -> b) -> RevokedSessions -> RevokedSessions #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RevokedSessions -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RevokedSessions -> r #

gmapQ :: (forall d. Data d => d -> u) -> RevokedSessions -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> RevokedSessions -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RevokedSessions -> m RevokedSessions #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RevokedSessions -> m RevokedSessions #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RevokedSessions -> m RevokedSessions #

Show RevokedSessions Source # 
Instance details

Defined in OryKratos.Types.Types

Generic RevokedSessions Source # 
Instance details

Defined in OryKratos.Types.Types

Associated Types

type Rep RevokedSessions :: Type -> Type #

ToJSON RevokedSessions Source # 
Instance details

Defined in OryKratos.Types.Types

FromJSON RevokedSessions Source # 
Instance details

Defined in OryKratos.Types.Types

type Rep RevokedSessions Source # 
Instance details

Defined in OryKratos.Types.Types

type Rep RevokedSessions = D1 ('MetaData "RevokedSessions" "OryKratos.Types.Types" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "RevokedSessions" 'PrefixI 'True) (S1 ('MetaSel ('Just "count") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Integer))))

data SessionAuthenticationMethod Source #

A singular authenticator used during authentication / login.

Constructors

SessionAuthenticationMethod 

Fields

Instances

Instances details
Eq SessionAuthenticationMethod Source # 
Instance details

Defined in OryKratos.Types.Types

Data SessionAuthenticationMethod Source # 
Instance details

Defined in OryKratos.Types.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SessionAuthenticationMethod -> c SessionAuthenticationMethod #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SessionAuthenticationMethod #

toConstr :: SessionAuthenticationMethod -> Constr #

dataTypeOf :: SessionAuthenticationMethod -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SessionAuthenticationMethod) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SessionAuthenticationMethod) #

gmapT :: (forall b. Data b => b -> b) -> SessionAuthenticationMethod -> SessionAuthenticationMethod #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SessionAuthenticationMethod -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SessionAuthenticationMethod -> r #

gmapQ :: (forall d. Data d => d -> u) -> SessionAuthenticationMethod -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SessionAuthenticationMethod -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SessionAuthenticationMethod -> m SessionAuthenticationMethod #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SessionAuthenticationMethod -> m SessionAuthenticationMethod #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SessionAuthenticationMethod -> m SessionAuthenticationMethod #

Show SessionAuthenticationMethod Source # 
Instance details

Defined in OryKratos.Types.Types

Generic SessionAuthenticationMethod Source # 
Instance details

Defined in OryKratos.Types.Types

Associated Types

type Rep SessionAuthenticationMethod :: Type -> Type #

ToJSON SessionAuthenticationMethod Source # 
Instance details

Defined in OryKratos.Types.Types

FromJSON SessionAuthenticationMethod Source # 
Instance details

Defined in OryKratos.Types.Types

type Rep SessionAuthenticationMethod Source # 
Instance details

Defined in OryKratos.Types.Types

type Rep SessionAuthenticationMethod = D1 ('MetaData "SessionAuthenticationMethod" "OryKratos.Types.Types" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "SessionAuthenticationMethod" 'PrefixI 'True) (S1 ('MetaSel ('Just "aal") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe AuthenticatorAssuranceLevel)) :*: (S1 ('MetaSel ('Just "completed_at") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe UTCTime)) :*: S1 ('MetaSel ('Just "method") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)))))

data SessionDevice Source #

Constructors

SessionDevice 

Fields

Instances

Instances details
Eq SessionDevice Source # 
Instance details

Defined in OryKratos.Types.Types

Data SessionDevice Source # 
Instance details

Defined in OryKratos.Types.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SessionDevice -> c SessionDevice #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SessionDevice #

toConstr :: SessionDevice -> Constr #

dataTypeOf :: SessionDevice -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SessionDevice) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SessionDevice) #

gmapT :: (forall b. Data b => b -> b) -> SessionDevice -> SessionDevice #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SessionDevice -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SessionDevice -> r #

gmapQ :: (forall d. Data d => d -> u) -> SessionDevice -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SessionDevice -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SessionDevice -> m SessionDevice #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SessionDevice -> m SessionDevice #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SessionDevice -> m SessionDevice #

Show SessionDevice Source # 
Instance details

Defined in OryKratos.Types.Types

Generic SessionDevice Source # 
Instance details

Defined in OryKratos.Types.Types

Associated Types

type Rep SessionDevice :: Type -> Type #

ToJSON SessionDevice Source # 
Instance details

Defined in OryKratos.Types.Types

FromJSON SessionDevice Source # 
Instance details

Defined in OryKratos.Types.Types

type Rep SessionDevice Source # 
Instance details

Defined in OryKratos.Types.Types

type Rep SessionDevice = D1 ('MetaData "SessionDevice" "OryKratos.Types.Types" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "SessionDevice" 'PrefixI 'True) (S1 ('MetaSel ('Just "user_agent") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text))))

data SubmitSelfServiceFlowWithWebAuthnRegistrationMethod Source #

Constructors

SubmitSelfServiceFlowWithWebAuthnRegistrationMethod 

Fields

Instances

Instances details
Eq SubmitSelfServiceFlowWithWebAuthnRegistrationMethod Source # 
Instance details

Defined in OryKratos.Types.Types

Data SubmitSelfServiceFlowWithWebAuthnRegistrationMethod Source # 
Instance details

Defined in OryKratos.Types.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SubmitSelfServiceFlowWithWebAuthnRegistrationMethod -> c SubmitSelfServiceFlowWithWebAuthnRegistrationMethod #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SubmitSelfServiceFlowWithWebAuthnRegistrationMethod #

toConstr :: SubmitSelfServiceFlowWithWebAuthnRegistrationMethod -> Constr #

dataTypeOf :: SubmitSelfServiceFlowWithWebAuthnRegistrationMethod -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SubmitSelfServiceFlowWithWebAuthnRegistrationMethod) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SubmitSelfServiceFlowWithWebAuthnRegistrationMethod) #

gmapT :: (forall b. Data b => b -> b) -> SubmitSelfServiceFlowWithWebAuthnRegistrationMethod -> SubmitSelfServiceFlowWithWebAuthnRegistrationMethod #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceFlowWithWebAuthnRegistrationMethod -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SubmitSelfServiceFlowWithWebAuthnRegistrationMethod -> r #

gmapQ :: (forall d. Data d => d -> u) -> SubmitSelfServiceFlowWithWebAuthnRegistrationMethod -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SubmitSelfServiceFlowWithWebAuthnRegistrationMethod -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SubmitSelfServiceFlowWithWebAuthnRegistrationMethod -> m SubmitSelfServiceFlowWithWebAuthnRegistrationMethod #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceFlowWithWebAuthnRegistrationMethod -> m SubmitSelfServiceFlowWithWebAuthnRegistrationMethod #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SubmitSelfServiceFlowWithWebAuthnRegistrationMethod -> m SubmitSelfServiceFlowWithWebAuthnRegistrationMethod #

Show SubmitSelfServiceFlowWithWebAuthnRegistrationMethod Source # 
Instance details

Defined in OryKratos.Types.Types

Generic SubmitSelfServiceFlowWithWebAuthnRegistrationMethod Source # 
Instance details

Defined in OryKratos.Types.Types

ToJSON SubmitSelfServiceFlowWithWebAuthnRegistrationMethod Source # 
Instance details

Defined in OryKratos.Types.Types

FromJSON SubmitSelfServiceFlowWithWebAuthnRegistrationMethod Source # 
Instance details

Defined in OryKratos.Types.Types

type Rep SubmitSelfServiceFlowWithWebAuthnRegistrationMethod Source # 
Instance details

Defined in OryKratos.Types.Types

type Rep SubmitSelfServiceFlowWithWebAuthnRegistrationMethod = D1 ('MetaData "SubmitSelfServiceFlowWithWebAuthnRegistrationMethod" "OryKratos.Types.Types" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "SubmitSelfServiceFlowWithWebAuthnRegistrationMethod" 'PrefixI 'True) (S1 ('MetaSel ('Just "webauthn_register") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "webauthn_register_displayname") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text))))

data VerifiableIdentityAddress Source #

VerifiableAddress is an identity's verifiable address

Constructors

VerifiableIdentityAddress 

Fields

Instances

Instances details
Eq VerifiableIdentityAddress Source # 
Instance details

Defined in OryKratos.Types.Types

Data VerifiableIdentityAddress Source # 
Instance details

Defined in OryKratos.Types.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> VerifiableIdentityAddress -> c VerifiableIdentityAddress #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c VerifiableIdentityAddress #

toConstr :: VerifiableIdentityAddress -> Constr #

dataTypeOf :: VerifiableIdentityAddress -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c VerifiableIdentityAddress) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c VerifiableIdentityAddress) #

gmapT :: (forall b. Data b => b -> b) -> VerifiableIdentityAddress -> VerifiableIdentityAddress #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> VerifiableIdentityAddress -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> VerifiableIdentityAddress -> r #

gmapQ :: (forall d. Data d => d -> u) -> VerifiableIdentityAddress -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> VerifiableIdentityAddress -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> VerifiableIdentityAddress -> m VerifiableIdentityAddress #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> VerifiableIdentityAddress -> m VerifiableIdentityAddress #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> VerifiableIdentityAddress -> m VerifiableIdentityAddress #

Show VerifiableIdentityAddress Source # 
Instance details

Defined in OryKratos.Types.Types

Generic VerifiableIdentityAddress Source # 
Instance details

Defined in OryKratos.Types.Types

Associated Types

type Rep VerifiableIdentityAddress :: Type -> Type #

ToJSON VerifiableIdentityAddress Source # 
Instance details

Defined in OryKratos.Types.Types

FromJSON VerifiableIdentityAddress Source # 
Instance details

Defined in OryKratos.Types.Types

type Rep VerifiableIdentityAddress Source # 
Instance details

Defined in OryKratos.Types.Types

data Version Source #

Constructors

Version 

Fields

Instances

Instances details
Eq Version Source # 
Instance details

Defined in OryKratos.Types.Types

Methods

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

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

Data Version Source # 
Instance details

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 # 
Instance details

Defined in OryKratos.Types.Types

Generic Version Source # 
Instance details

Defined in OryKratos.Types.Types

Associated Types

type Rep Version :: Type -> Type #

Methods

from :: Version -> Rep Version x #

to :: Rep Version x -> Version #

ToJSON Version Source # 
Instance details

Defined in OryKratos.Types.Types

FromJSON Version Source # 
Instance details

Defined in OryKratos.Types.Types

type Rep Version Source # 
Instance details

Defined in OryKratos.Types.Types

type Rep Version = D1 ('MetaData "Version" "OryKratos.Types.Types" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "Version" 'PrefixI 'True) (S1 ('MetaSel ('Just "version") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text))))

data UiContainer Source #

Container represents a HTML Form. The container can work with both HTTP Form and JSON requests

Constructors

UiContainer 

Fields

Instances

Instances details
Eq UiContainer Source # 
Instance details

Defined in OryKratos.Types.Ui

Data UiContainer Source # 
Instance details

Defined in OryKratos.Types.Ui

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UiContainer -> c UiContainer #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UiContainer #

toConstr :: UiContainer -> Constr #

dataTypeOf :: UiContainer -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UiContainer) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UiContainer) #

gmapT :: (forall b. Data b => b -> b) -> UiContainer -> UiContainer #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UiContainer -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UiContainer -> r #

gmapQ :: (forall d. Data d => d -> u) -> UiContainer -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UiContainer -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UiContainer -> m UiContainer #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UiContainer -> m UiContainer #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UiContainer -> m UiContainer #

Show UiContainer Source # 
Instance details

Defined in OryKratos.Types.Ui

Generic UiContainer Source # 
Instance details

Defined in OryKratos.Types.Ui

Associated Types

type Rep UiContainer :: Type -> Type #

ToJSON UiContainer Source # 
Instance details

Defined in OryKratos.Types.Ui

FromJSON UiContainer Source # 
Instance details

Defined in OryKratos.Types.Ui

type Rep UiContainer Source # 
Instance details

Defined in OryKratos.Types.Ui

type Rep UiContainer = D1 ('MetaData "UiContainer" "OryKratos.Types.Ui" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "UiContainer" 'PrefixI 'True) ((S1 ('MetaSel ('Just "action") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "messages") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe [UiText]))) :*: (S1 ('MetaSel ('Just "method") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "nodes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [UiNode]))))

data UiNode Source #

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

Instances details
Eq UiNode Source # 
Instance details

Defined in OryKratos.Types.Ui

Methods

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

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

Data UiNode Source # 
Instance details

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 # 
Instance details

Defined in OryKratos.Types.Ui

Generic UiNode Source # 
Instance details

Defined in OryKratos.Types.Ui

Associated Types

type Rep UiNode :: Type -> Type #

Methods

from :: UiNode -> Rep UiNode x #

to :: Rep UiNode x -> UiNode #

ToJSON UiNode Source # 
Instance details

Defined in OryKratos.Types.Ui

FromJSON UiNode Source # 
Instance details

Defined in OryKratos.Types.Ui

type Rep UiNode Source # 
Instance details

Defined in OryKratos.Types.Ui

data UiNodeAnchorAttributes Source #

Constructors

UiNodeAnchorAttributes 

Fields

  • href :: Text

    The link's href (destination) URL. format: uri

  • id :: Text

    A unique identifier

  • node_type :: Text

    NodeType represents this node's types. It is a mirror of `node.type` and is primarily used to allow compatibility with OpenAPI 3.0. In this struct it technically always is "a".

  • title :: UiText
     

Instances

Instances details
Eq UiNodeAnchorAttributes Source # 
Instance details

Defined in OryKratos.Types.Ui

Data UiNodeAnchorAttributes Source # 
Instance details

Defined in OryKratos.Types.Ui

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UiNodeAnchorAttributes -> c UiNodeAnchorAttributes #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UiNodeAnchorAttributes #

toConstr :: UiNodeAnchorAttributes -> Constr #

dataTypeOf :: UiNodeAnchorAttributes -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UiNodeAnchorAttributes) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UiNodeAnchorAttributes) #

gmapT :: (forall b. Data b => b -> b) -> UiNodeAnchorAttributes -> UiNodeAnchorAttributes #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UiNodeAnchorAttributes -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UiNodeAnchorAttributes -> r #

gmapQ :: (forall d. Data d => d -> u) -> UiNodeAnchorAttributes -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UiNodeAnchorAttributes -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UiNodeAnchorAttributes -> m UiNodeAnchorAttributes #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UiNodeAnchorAttributes -> m UiNodeAnchorAttributes #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UiNodeAnchorAttributes -> m UiNodeAnchorAttributes #

Show UiNodeAnchorAttributes Source # 
Instance details

Defined in OryKratos.Types.Ui

Generic UiNodeAnchorAttributes Source # 
Instance details

Defined in OryKratos.Types.Ui

Associated Types

type Rep UiNodeAnchorAttributes :: Type -> Type #

ToJSON UiNodeAnchorAttributes Source # 
Instance details

Defined in OryKratos.Types.Ui

FromJSON UiNodeAnchorAttributes Source # 
Instance details

Defined in OryKratos.Types.Ui

type Rep UiNodeAnchorAttributes Source # 
Instance details

Defined in OryKratos.Types.Ui

type Rep UiNodeAnchorAttributes = D1 ('MetaData "UiNodeAnchorAttributes" "OryKratos.Types.Ui" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "UiNodeAnchorAttributes" 'PrefixI 'True) ((S1 ('MetaSel ('Just "href") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "id") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)) :*: (S1 ('MetaSel ('Just "node_type") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "title") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UiText))))

data UiNodeAttributes Source #

Constructors

UiNodeAttributes 

Fields

Instances

Instances details
Eq UiNodeAttributes Source # 
Instance details

Defined in OryKratos.Types.Ui

Data UiNodeAttributes Source # 
Instance details

Defined in OryKratos.Types.Ui

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UiNodeAttributes -> c UiNodeAttributes #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UiNodeAttributes #

toConstr :: UiNodeAttributes -> Constr #

dataTypeOf :: UiNodeAttributes -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UiNodeAttributes) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UiNodeAttributes) #

gmapT :: (forall b. Data b => b -> b) -> UiNodeAttributes -> UiNodeAttributes #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UiNodeAttributes -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UiNodeAttributes -> r #

gmapQ :: (forall d. Data d => d -> u) -> UiNodeAttributes -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UiNodeAttributes -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UiNodeAttributes -> m UiNodeAttributes #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UiNodeAttributes -> m UiNodeAttributes #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UiNodeAttributes -> m UiNodeAttributes #

Show UiNodeAttributes Source # 
Instance details

Defined in OryKratos.Types.Ui

Generic UiNodeAttributes Source # 
Instance details

Defined in OryKratos.Types.Ui

Associated Types

type Rep UiNodeAttributes :: Type -> Type #

ToJSON UiNodeAttributes Source # 
Instance details

Defined in OryKratos.Types.Ui

FromJSON UiNodeAttributes Source # 
Instance details

Defined in OryKratos.Types.Ui

type Rep UiNodeAttributes Source # 
Instance details

Defined in OryKratos.Types.Ui

type Rep UiNodeAttributes = D1 ('MetaData "UiNodeAttributes" "OryKratos.Types.Ui" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "UiNodeAttributes" 'PrefixI 'True) ((((S1 ('MetaSel ('Just "disabled") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "label") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe UiText))) :*: (S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: (S1 ('MetaSel ('Just "node_type") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "onclick") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text))))) :*: ((S1 ('MetaSel ('Just "_pattern") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "required") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool))) :*: (S1 ('MetaSel ('Just "_type") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: (S1 ('MetaSel ('Just "value") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Value)) :*: S1 ('MetaSel ('Just "id") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text))))) :*: (((S1 ('MetaSel ('Just "text") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UiText) :*: S1 ('MetaSel ('Just "height") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Integer)) :*: (S1 ('MetaSel ('Just "src") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: (S1 ('MetaSel ('Just "width") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Integer) :*: S1 ('MetaSel ('Just "href") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))) :*: ((S1 ('MetaSel ('Just "title") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UiText) :*: (S1 ('MetaSel ('Just "async") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "crossorigin") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text))) :*: (S1 ('MetaSel ('Just "integrity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: (S1 ('MetaSel ('Just "nonce") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "referrerpolicy") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))))))

data UiNodeImageAttributes Source #

Constructors

UiNodeImageAttributes 

Fields

  • height :: Integer

    Height of the image

  • id :: Text

    A unique identifier

  • node_type :: Text

    NodeType represents this node's types. It is a mirror of `node.type` and is primarily used to allow compatibility with OpenAPI 3.0. In this struct it technically always is "img".

  • src :: Text

    The image's source URL. format: uri

  • width :: Integer

    Width of the image

Instances

Instances details
Eq UiNodeImageAttributes Source # 
Instance details

Defined in OryKratos.Types.Ui

Data UiNodeImageAttributes Source # 
Instance details

Defined in OryKratos.Types.Ui

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UiNodeImageAttributes -> c UiNodeImageAttributes #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UiNodeImageAttributes #

toConstr :: UiNodeImageAttributes -> Constr #

dataTypeOf :: UiNodeImageAttributes -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UiNodeImageAttributes) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UiNodeImageAttributes) #

gmapT :: (forall b. Data b => b -> b) -> UiNodeImageAttributes -> UiNodeImageAttributes #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UiNodeImageAttributes -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UiNodeImageAttributes -> r #

gmapQ :: (forall d. Data d => d -> u) -> UiNodeImageAttributes -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UiNodeImageAttributes -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UiNodeImageAttributes -> m UiNodeImageAttributes #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UiNodeImageAttributes -> m UiNodeImageAttributes #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UiNodeImageAttributes -> m UiNodeImageAttributes #

Show UiNodeImageAttributes Source # 
Instance details

Defined in OryKratos.Types.Ui

Generic UiNodeImageAttributes Source # 
Instance details

Defined in OryKratos.Types.Ui

Associated Types

type Rep UiNodeImageAttributes :: Type -> Type #

ToJSON UiNodeImageAttributes Source # 
Instance details

Defined in OryKratos.Types.Ui

FromJSON UiNodeImageAttributes Source # 
Instance details

Defined in OryKratos.Types.Ui

type Rep UiNodeImageAttributes Source # 
Instance details

Defined in OryKratos.Types.Ui

type Rep UiNodeImageAttributes = D1 ('MetaData "UiNodeImageAttributes" "OryKratos.Types.Ui" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "UiNodeImageAttributes" 'PrefixI 'True) ((S1 ('MetaSel ('Just "height") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Integer) :*: S1 ('MetaSel ('Just "id") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)) :*: (S1 ('MetaSel ('Just "node_type") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: (S1 ('MetaSel ('Just "src") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "width") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Integer)))))

data UiNodeInputAttributes Source #

InputAttributes represents the attributes of an input node

Constructors

UiNodeInputAttributes 

Fields

Instances

Instances details
Eq UiNodeInputAttributes Source # 
Instance details

Defined in OryKratos.Types.Ui

Data UiNodeInputAttributes Source # 
Instance details

Defined in OryKratos.Types.Ui

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UiNodeInputAttributes -> c UiNodeInputAttributes #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UiNodeInputAttributes #

toConstr :: UiNodeInputAttributes -> Constr #

dataTypeOf :: UiNodeInputAttributes -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UiNodeInputAttributes) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UiNodeInputAttributes) #

gmapT :: (forall b. Data b => b -> b) -> UiNodeInputAttributes -> UiNodeInputAttributes #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UiNodeInputAttributes -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UiNodeInputAttributes -> r #

gmapQ :: (forall d. Data d => d -> u) -> UiNodeInputAttributes -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UiNodeInputAttributes -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UiNodeInputAttributes -> m UiNodeInputAttributes #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UiNodeInputAttributes -> m UiNodeInputAttributes #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UiNodeInputAttributes -> m UiNodeInputAttributes #

Show UiNodeInputAttributes Source # 
Instance details

Defined in OryKratos.Types.Ui

Generic UiNodeInputAttributes Source # 
Instance details

Defined in OryKratos.Types.Ui

Associated Types

type Rep UiNodeInputAttributes :: Type -> Type #

ToJSON UiNodeInputAttributes Source # 
Instance details

Defined in OryKratos.Types.Ui

FromJSON UiNodeInputAttributes Source # 
Instance details

Defined in OryKratos.Types.Ui

type Rep UiNodeInputAttributes Source # 
Instance details

Defined in OryKratos.Types.Ui

data UiNodeMeta Source #

This might include a label and other information that can optionally be used to render UIs.

Constructors

UiNodeMeta 

Fields

Instances

Instances details
Eq UiNodeMeta Source # 
Instance details

Defined in OryKratos.Types.Ui

Data UiNodeMeta Source # 
Instance details

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 # 
Instance details

Defined in OryKratos.Types.Ui

Generic UiNodeMeta Source # 
Instance details

Defined in OryKratos.Types.Ui

Associated Types

type Rep UiNodeMeta :: Type -> Type #

ToJSON UiNodeMeta Source # 
Instance details

Defined in OryKratos.Types.Ui

FromJSON UiNodeMeta Source # 
Instance details

Defined in OryKratos.Types.Ui

type Rep UiNodeMeta Source # 
Instance details

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

  • async :: Bool

    The script async type

  • crossorigin :: Text

    The script cross origin policy

  • id :: Text

    A unique identifier

  • integrity :: Text

    The script's integrity hash

  • node_type :: Text

    NodeType represents this node's types. It is a mirror of `node.type` and is primarily used to allow compatibility with OpenAPI 3.0. In this struct it technically always is "script".

  • nonce :: Text

    Nonce for CSP A nonce you may want to use to improve your Content Security Policy. You do not have to use this value but if you want to improve your CSP policies you may use it. You can also choose to use your own nonce value!

  • referrerpolicy :: Text

    The script referrer policy

  • src :: Text

    The script source

  • _type :: Text

    The script MIME type

Instances

Instances details
Eq UiNodeScriptAttributes Source # 
Instance details

Defined in OryKratos.Types.Ui

Data UiNodeScriptAttributes Source # 
Instance details

Defined in OryKratos.Types.Ui

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UiNodeScriptAttributes -> c UiNodeScriptAttributes #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UiNodeScriptAttributes #

toConstr :: UiNodeScriptAttributes -> Constr #

dataTypeOf :: UiNodeScriptAttributes -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UiNodeScriptAttributes) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UiNodeScriptAttributes) #

gmapT :: (forall b. Data b => b -> b) -> UiNodeScriptAttributes -> UiNodeScriptAttributes #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UiNodeScriptAttributes -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UiNodeScriptAttributes -> r #

gmapQ :: (forall d. Data d => d -> u) -> UiNodeScriptAttributes -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UiNodeScriptAttributes -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UiNodeScriptAttributes -> m UiNodeScriptAttributes #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UiNodeScriptAttributes -> m UiNodeScriptAttributes #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UiNodeScriptAttributes -> m UiNodeScriptAttributes #

Show UiNodeScriptAttributes Source # 
Instance details

Defined in OryKratos.Types.Ui

Generic UiNodeScriptAttributes Source # 
Instance details

Defined in OryKratos.Types.Ui

Associated Types

type Rep UiNodeScriptAttributes :: Type -> Type #

ToJSON UiNodeScriptAttributes Source # 
Instance details

Defined in OryKratos.Types.Ui

FromJSON UiNodeScriptAttributes Source # 
Instance details

Defined in OryKratos.Types.Ui

type Rep UiNodeScriptAttributes Source # 
Instance details

Defined in OryKratos.Types.Ui

data UiNodeTextAttributes Source #

Constructors

UiNodeTextAttributes 

Fields

  • id :: Text

    A unique identifier

  • node_type :: Text

    NodeType represents this node's types. It is a mirror of `node.type` and is primarily used to allow compatibility with OpenAPI 3.0. In this struct it technically always is "text".

  • text :: UiText
     

Instances

Instances details
Eq UiNodeTextAttributes Source # 
Instance details

Defined in OryKratos.Types.Ui

Data UiNodeTextAttributes Source # 
Instance details

Defined in OryKratos.Types.Ui

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UiNodeTextAttributes -> c UiNodeTextAttributes #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UiNodeTextAttributes #

toConstr :: UiNodeTextAttributes -> Constr #

dataTypeOf :: UiNodeTextAttributes -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UiNodeTextAttributes) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UiNodeTextAttributes) #

gmapT :: (forall b. Data b => b -> b) -> UiNodeTextAttributes -> UiNodeTextAttributes #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UiNodeTextAttributes -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UiNodeTextAttributes -> r #

gmapQ :: (forall d. Data d => d -> u) -> UiNodeTextAttributes -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UiNodeTextAttributes -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UiNodeTextAttributes -> m UiNodeTextAttributes #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UiNodeTextAttributes -> m UiNodeTextAttributes #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UiNodeTextAttributes -> m UiNodeTextAttributes #

Show UiNodeTextAttributes Source # 
Instance details

Defined in OryKratos.Types.Ui

Generic UiNodeTextAttributes Source # 
Instance details

Defined in OryKratos.Types.Ui

Associated Types

type Rep UiNodeTextAttributes :: Type -> Type #

ToJSON UiNodeTextAttributes Source # 
Instance details

Defined in OryKratos.Types.Ui

FromJSON UiNodeTextAttributes Source # 
Instance details

Defined in OryKratos.Types.Ui

type Rep UiNodeTextAttributes Source # 
Instance details

Defined in OryKratos.Types.Ui

type Rep UiNodeTextAttributes = D1 ('MetaData "UiNodeTextAttributes" "OryKratos.Types.Ui" "ory-kratos-0.0.10.0-ADcQHECC7ZqKdeAVQl4s1i" 'False) (C1 ('MetaCons "UiNodeTextAttributes" 'PrefixI 'True) (S1 ('MetaSel ('Just "id") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: (S1 ('MetaSel ('Just "node_type") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "text") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UiText))))

data UiText Source #

Constructors

UiText 

Fields

Instances

Instances details
Eq UiText Source # 
Instance details

Defined in OryKratos.Types.Ui

Methods

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

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

Data UiText Source # 
Instance details

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 # 
Instance details

Defined in OryKratos.Types.Ui

Generic UiText Source # 
Instance details

Defined in OryKratos.Types.Ui

Associated Types

type Rep UiText :: Type -> Type #

Methods

from :: UiText -> Rep UiText x #

to :: Rep UiText x -> UiText #

ToJSON UiText Source # 
Instance details

Defined in OryKratos.Types.Ui

FromJSON UiText Source # 
Instance details

Defined in OryKratos.Types.Ui

type Rep UiText Source # 
Instance details

Defined in OryKratos.Types.Ui