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

OryKratos.Types

Synopsis

Documentation

data LoginFlow 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

LoginFlow 

Fields

  • active :: Maybe Text

    and so on.

  • expires_at :: UTCTime

    ExpiresAt is the time (UTC) when the flow expires. If the user still wishes to log in, a new flow has to be initiated.

  • forced :: Maybe Bool

    Forced stores whether this login flow should enforce re-authentication.

  • id :: UUID
     
  • issued_at :: UTCTime

    IssuedAt is the time (UTC) when the flow started.

  • messages :: Maybe [Message]
     
  • methods :: LoginFlowMethods

    List of login methods This is the list of available login methods with their required form fields, such as identifier and $sel:password:LoginFlowMethods for the password login method. This will also contain error messages such as "password can not be empty".

  • 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.

  • _type :: Maybe Text

    The flow type can either be api or browser.

Instances

Instances details
Eq LoginFlow Source # 
Instance details

Defined in OryKratos.Types.Login

Data LoginFlow Source # 
Instance details

Defined in OryKratos.Types.Login

Methods

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

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

toConstr :: LoginFlow -> Constr #

dataTypeOf :: LoginFlow -> DataType #

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

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

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

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

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

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

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

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

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

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

Show LoginFlow Source # 
Instance details

Defined in OryKratos.Types.Login

Generic LoginFlow Source # 
Instance details

Defined in OryKratos.Types.Login

Associated Types

type Rep LoginFlow :: Type -> Type #

ToJSON LoginFlow Source # 
Instance details

Defined in OryKratos.Types.Login

FromJSON LoginFlow Source # 
Instance details

Defined in OryKratos.Types.Login

type Rep LoginFlow Source # 
Instance details

Defined in OryKratos.Types.Login

data LoginFlowMethods Source #

Instances

Instances details
Eq LoginFlowMethods Source # 
Instance details

Defined in OryKratos.Types.Login

Data LoginFlowMethods Source # 
Instance details

Defined in OryKratos.Types.Login

Methods

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

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

toConstr :: LoginFlowMethods -> Constr #

dataTypeOf :: LoginFlowMethods -> DataType #

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

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

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

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

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

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

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

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

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

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

Show LoginFlowMethods Source # 
Instance details

Defined in OryKratos.Types.Login

Generic LoginFlowMethods Source # 
Instance details

Defined in OryKratos.Types.Login

Associated Types

type Rep LoginFlowMethods :: Type -> Type #

ToJSON LoginFlowMethods Source # 
Instance details

Defined in OryKratos.Types.Login

FromJSON LoginFlowMethods Source # 
Instance details

Defined in OryKratos.Types.Login

type Rep LoginFlowMethods Source # 
Instance details

Defined in OryKratos.Types.Login

type Rep LoginFlowMethods = D1 ('MetaData "LoginFlowMethods" "OryKratos.Types.Login" "ory-kratos-0.0.5.10-7toMqH0VmKGIuO2284toHo" 'False) (C1 ('MetaCons "LoginFlowMethods" 'PrefixI 'True) (S1 ('MetaSel ('Just "password") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe LoginFlowMethod)) :*: S1 ('MetaSel ('Just "oidc") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe LoginFlowMethod))))

data LoginFlowMethod Source #

 

Constructors

LoginFlowMethod 

Fields

Instances

Instances details
Eq LoginFlowMethod Source # 
Instance details

Defined in OryKratos.Types.Login

Data LoginFlowMethod Source # 
Instance details

Defined in OryKratos.Types.Login

Methods

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

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

toConstr :: LoginFlowMethod -> Constr #

dataTypeOf :: LoginFlowMethod -> DataType #

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

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

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

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

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

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

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

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

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

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

Show LoginFlowMethod Source # 
Instance details

Defined in OryKratos.Types.Login

Generic LoginFlowMethod Source # 
Instance details

Defined in OryKratos.Types.Login

Associated Types

type Rep LoginFlowMethod :: Type -> Type #

ToJSON LoginFlowMethod Source # 
Instance details

Defined in OryKratos.Types.Login

FromJSON LoginFlowMethod Source # 
Instance details

Defined in OryKratos.Types.Login

type Rep LoginFlowMethod Source # 
Instance details

Defined in OryKratos.Types.Login

type Rep LoginFlowMethod = D1 ('MetaData "LoginFlowMethod" "OryKratos.Types.Login" "ory-kratos-0.0.5.10-7toMqH0VmKGIuO2284toHo" 'False) (C1 ('MetaCons "LoginFlowMethod" 'PrefixI 'True) (S1 ('MetaSel ('Just "config") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 LoginFlowMethodConfig) :*: S1 ('MetaSel ('Just "method") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

data LoginFlowMethodConfig Source #

 

Constructors

LoginFlowMethodConfig 

Fields

Instances

Instances details
Eq LoginFlowMethodConfig Source # 
Instance details

Defined in OryKratos.Types.Login

Data LoginFlowMethodConfig Source # 
Instance details

Defined in OryKratos.Types.Login

Methods

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

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

toConstr :: LoginFlowMethodConfig -> Constr #

dataTypeOf :: LoginFlowMethodConfig -> DataType #

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

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

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

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

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

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

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

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

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

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

Show LoginFlowMethodConfig Source # 
Instance details

Defined in OryKratos.Types.Login

Generic LoginFlowMethodConfig Source # 
Instance details

Defined in OryKratos.Types.Login

Associated Types

type Rep LoginFlowMethodConfig :: Type -> Type #

ToJSON LoginFlowMethodConfig Source # 
Instance details

Defined in OryKratos.Types.Login

FromJSON LoginFlowMethodConfig Source # 
Instance details

Defined in OryKratos.Types.Login

type Rep LoginFlowMethodConfig Source # 
Instance details

Defined in OryKratos.Types.Login

type Rep LoginFlowMethodConfig = D1 ('MetaData "LoginFlowMethodConfig" "OryKratos.Types.Login" "ory-kratos-0.0.5.10-7toMqH0VmKGIuO2284toHo" 'False) (C1 ('MetaCons "LoginFlowMethodConfig" 'PrefixI 'True) ((S1 ('MetaSel ('Just "action") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "fields") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FormField])) :*: (S1 ('MetaSel ('Just "messages") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe [Message])) :*: (S1 ('MetaSel ('Just "method") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "providers") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe [FormField]))))))

data LoginViaApiResponse Source #

The Response for Login Flows via API

Constructors

LoginViaApiResponse 

Fields

  • session :: Session
     
  • session_token :: 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 LoginViaApiResponse Source # 
Instance details

Defined in OryKratos.Types.Login

Data LoginViaApiResponse Source # 
Instance details

Defined in OryKratos.Types.Login

Methods

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

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

toConstr :: LoginViaApiResponse -> Constr #

dataTypeOf :: LoginViaApiResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show LoginViaApiResponse Source # 
Instance details

Defined in OryKratos.Types.Login

Generic LoginViaApiResponse Source # 
Instance details

Defined in OryKratos.Types.Login

Associated Types

type Rep LoginViaApiResponse :: Type -> Type #

ToJSON LoginViaApiResponse Source # 
Instance details

Defined in OryKratos.Types.Login

FromJSON LoginViaApiResponse Source # 
Instance details

Defined in OryKratos.Types.Login

type Rep LoginViaApiResponse Source # 
Instance details

Defined in OryKratos.Types.Login

type Rep LoginViaApiResponse = D1 ('MetaData "LoginViaApiResponse" "OryKratos.Types.Login" "ory-kratos-0.0.5.10-7toMqH0VmKGIuO2284toHo" 'False) (C1 ('MetaCons "LoginViaApiResponse" 'PrefixI 'True) (S1 ('MetaSel ('Just "session") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Session) :*: S1 ('MetaSel ('Just "session_token") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

data Message Source #

 

Constructors

Message 

Fields

Instances

Instances details
Eq Message Source # 
Instance details

Defined in OryKratos.Types.Misc

Methods

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

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

Data Message Source # 
Instance details

Defined in OryKratos.Types.Misc

Methods

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

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

toConstr :: Message -> Constr #

dataTypeOf :: Message -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Message Source # 
Instance details

Defined in OryKratos.Types.Misc

Generic Message Source # 
Instance details

Defined in OryKratos.Types.Misc

Associated Types

type Rep Message :: Type -> Type #

Methods

from :: Message -> Rep Message x #

to :: Rep Message x -> Message #

ToJSON Message Source # 
Instance details

Defined in OryKratos.Types.Misc

FromJSON Message Source # 
Instance details

Defined in OryKratos.Types.Misc

type Rep Message Source # 
Instance details

Defined in OryKratos.Types.Misc

type Rep Message = D1 ('MetaData "Message" "OryKratos.Types.Misc" "ory-kratos-0.0.5.10-7toMqH0VmKGIuO2284toHo" 'False) (C1 ('MetaCons "Message" 'PrefixI 'True) ((S1 ('MetaSel ('Just "context") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Value)) :*: S1 ('MetaSel ('Just "id") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Integer))) :*: (S1 ('MetaSel ('Just "text") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "_type") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)))))

data ErrorContainer Source #

 

Constructors

ErrorContainer 

Fields

Instances

Instances details
Eq ErrorContainer Source # 
Instance details

Defined in OryKratos.Types.Misc

Data ErrorContainer Source # 
Instance details

Defined in OryKratos.Types.Misc

Methods

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

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

toConstr :: ErrorContainer -> Constr #

dataTypeOf :: ErrorContainer -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ErrorContainer Source # 
Instance details

Defined in OryKratos.Types.Misc

Generic ErrorContainer Source # 
Instance details

Defined in OryKratos.Types.Misc

Associated Types

type Rep ErrorContainer :: Type -> Type #

ToJSON ErrorContainer Source # 
Instance details

Defined in OryKratos.Types.Misc

FromJSON ErrorContainer Source # 
Instance details

Defined in OryKratos.Types.Misc

type Rep ErrorContainer Source # 
Instance details

Defined in OryKratos.Types.Misc

type Rep ErrorContainer = D1 ('MetaData "ErrorContainer" "OryKratos.Types.Misc" "ory-kratos-0.0.5.10-7toMqH0VmKGIuO2284toHo" 'False) (C1 ('MetaCons "ErrorContainer" 'PrefixI 'True) (S1 ('MetaSel ('Just "errors") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Value) :*: S1 ('MetaSel ('Just "id") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

data FormField Source #

Field represents a HTML Form Field

Constructors

FormField 

Fields

Instances

Instances details
Eq FormField Source # 
Instance details

Defined in OryKratos.Types.Misc

Data FormField Source # 
Instance details

Defined in OryKratos.Types.Misc

Methods

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

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

toConstr :: FormField -> Constr #

dataTypeOf :: FormField -> DataType #

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

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

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

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

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

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

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

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

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

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

Show FormField Source # 
Instance details

Defined in OryKratos.Types.Misc

Generic FormField Source # 
Instance details

Defined in OryKratos.Types.Misc

Associated Types

type Rep FormField :: Type -> Type #

ToJSON FormField Source # 
Instance details

Defined in OryKratos.Types.Misc

FromJSON FormField Source # 
Instance details

Defined in OryKratos.Types.Misc

type Rep FormField Source # 
Instance details

Defined in OryKratos.Types.Misc

data GenericError Source #

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

Instances

Instances details
Eq GenericError Source # 
Instance details

Defined in OryKratos.Types.Misc

Data GenericError Source # 
Instance details

Defined in OryKratos.Types.Misc

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.Misc

Generic GenericError Source # 
Instance details

Defined in OryKratos.Types.Misc

Associated Types

type Rep GenericError :: Type -> Type #

ToJSON GenericError Source # 
Instance details

Defined in OryKratos.Types.Misc

FromJSON GenericError Source # 
Instance details

Defined in OryKratos.Types.Misc

type Rep GenericError Source # 
Instance details

Defined in OryKratos.Types.Misc

type Rep GenericError = D1 ('MetaData "GenericError" "OryKratos.Types.Misc" "ory-kratos-0.0.5.10-7toMqH0VmKGIuO2284toHo" 'False) (C1 ('MetaCons "GenericError" 'PrefixI 'True) (S1 ('MetaSel ('Just "error") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe GenericErrorPayload))))

data GenericErrorPayload Source #

 

Constructors

GenericErrorPayload 

Fields

Instances

Instances details
Eq GenericErrorPayload Source # 
Instance details

Defined in OryKratos.Types.Misc

Data GenericErrorPayload Source # 
Instance details

Defined in OryKratos.Types.Misc

Methods

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

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

toConstr :: GenericErrorPayload -> Constr #

dataTypeOf :: GenericErrorPayload -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GenericErrorPayload Source # 
Instance details

Defined in OryKratos.Types.Misc

Generic GenericErrorPayload Source # 
Instance details

Defined in OryKratos.Types.Misc

Associated Types

type Rep GenericErrorPayload :: Type -> Type #

ToJSON GenericErrorPayload Source # 
Instance details

Defined in OryKratos.Types.Misc

FromJSON GenericErrorPayload Source # 
Instance details

Defined in OryKratos.Types.Misc

type Rep GenericErrorPayload Source # 
Instance details

Defined in OryKratos.Types.Misc

data HealthNotReadyStatus Source #

 

Constructors

HealthNotReadyStatus 

Fields

Instances

Instances details
Eq HealthNotReadyStatus Source # 
Instance details

Defined in OryKratos.Types.Misc

Data HealthNotReadyStatus Source # 
Instance details

Defined in OryKratos.Types.Misc

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.Misc

Generic HealthNotReadyStatus Source # 
Instance details

Defined in OryKratos.Types.Misc

Associated Types

type Rep HealthNotReadyStatus :: Type -> Type #

ToJSON HealthNotReadyStatus Source # 
Instance details

Defined in OryKratos.Types.Misc

FromJSON HealthNotReadyStatus Source # 
Instance details

Defined in OryKratos.Types.Misc

type Rep HealthNotReadyStatus Source # 
Instance details

Defined in OryKratos.Types.Misc

type Rep HealthNotReadyStatus = D1 ('MetaData "HealthNotReadyStatus" "OryKratos.Types.Misc" "ory-kratos-0.0.5.10-7toMqH0VmKGIuO2284toHo" 'False) (C1 ('MetaCons "HealthNotReadyStatus" 'PrefixI 'True) (S1 ('MetaSel ('Just "errors") '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.Misc

Data HealthStatus Source # 
Instance details

Defined in OryKratos.Types.Misc

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.Misc

Generic HealthStatus Source # 
Instance details

Defined in OryKratos.Types.Misc

Associated Types

type Rep HealthStatus :: Type -> Type #

ToJSON HealthStatus Source # 
Instance details

Defined in OryKratos.Types.Misc

FromJSON HealthStatus Source # 
Instance details

Defined in OryKratos.Types.Misc

type Rep HealthStatus Source # 
Instance details

Defined in OryKratos.Types.Misc

type Rep HealthStatus = D1 ('MetaData "HealthStatus" "OryKratos.Types.Misc" "ory-kratos-0.0.5.10-7toMqH0VmKGIuO2284toHo" 'False) (C1 ('MetaCons "HealthStatus" 'PrefixI 'True) (S1 ('MetaSel ('Just "status") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text))))

data CompleteSelfServiceLoginFlowWithPasswordMethod Source #

 

Constructors

CompleteSelfServiceLoginFlowWithPasswordMethod 

Fields

Instances

Instances details
Eq CompleteSelfServiceLoginFlowWithPasswordMethod Source # 
Instance details

Defined in OryKratos.Types.Misc

Data CompleteSelfServiceLoginFlowWithPasswordMethod Source # 
Instance details

Defined in OryKratos.Types.Misc

Methods

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

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

toConstr :: CompleteSelfServiceLoginFlowWithPasswordMethod -> Constr #

dataTypeOf :: CompleteSelfServiceLoginFlowWithPasswordMethod -> DataType #

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

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

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

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

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

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

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

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

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

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

Show CompleteSelfServiceLoginFlowWithPasswordMethod Source # 
Instance details

Defined in OryKratos.Types.Misc

Generic CompleteSelfServiceLoginFlowWithPasswordMethod Source # 
Instance details

Defined in OryKratos.Types.Misc

ToJSON CompleteSelfServiceLoginFlowWithPasswordMethod Source # 
Instance details

Defined in OryKratos.Types.Misc

FromJSON CompleteSelfServiceLoginFlowWithPasswordMethod Source # 
Instance details

Defined in OryKratos.Types.Misc

type Rep CompleteSelfServiceLoginFlowWithPasswordMethod Source # 
Instance details

Defined in OryKratos.Types.Misc

type Rep CompleteSelfServiceLoginFlowWithPasswordMethod = D1 ('MetaData "CompleteSelfServiceLoginFlowWithPasswordMethod" "OryKratos.Types.Misc" "ory-kratos-0.0.5.10-7toMqH0VmKGIuO2284toHo" 'False) (C1 ('MetaCons "CompleteSelfServiceLoginFlowWithPasswordMethod" '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 "password") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)))))

data CompleteSelfServiceRecoveryFlowWithLinkMethod Source #

 

Constructors

CompleteSelfServiceRecoveryFlowWithLinkMethod 

Fields

  • csrf_token :: Maybe Text

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

  • email :: Maybe 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 in: body

Instances

Instances details
Eq CompleteSelfServiceRecoveryFlowWithLinkMethod Source # 
Instance details

Defined in OryKratos.Types.Misc

Data CompleteSelfServiceRecoveryFlowWithLinkMethod Source # 
Instance details

Defined in OryKratos.Types.Misc

Methods

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

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

toConstr :: CompleteSelfServiceRecoveryFlowWithLinkMethod -> Constr #

dataTypeOf :: CompleteSelfServiceRecoveryFlowWithLinkMethod -> DataType #

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

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

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

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

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

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

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

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

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

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

Show CompleteSelfServiceRecoveryFlowWithLinkMethod Source # 
Instance details

Defined in OryKratos.Types.Misc

Generic CompleteSelfServiceRecoveryFlowWithLinkMethod Source # 
Instance details

Defined in OryKratos.Types.Misc

ToJSON CompleteSelfServiceRecoveryFlowWithLinkMethod Source # 
Instance details

Defined in OryKratos.Types.Misc

FromJSON CompleteSelfServiceRecoveryFlowWithLinkMethod Source # 
Instance details

Defined in OryKratos.Types.Misc

type Rep CompleteSelfServiceRecoveryFlowWithLinkMethod Source # 
Instance details

Defined in OryKratos.Types.Misc

type Rep CompleteSelfServiceRecoveryFlowWithLinkMethod = D1 ('MetaData "CompleteSelfServiceRecoveryFlowWithLinkMethod" "OryKratos.Types.Misc" "ory-kratos-0.0.5.10-7toMqH0VmKGIuO2284toHo" 'False) (C1 ('MetaCons "CompleteSelfServiceRecoveryFlowWithLinkMethod" 'PrefixI 'True) (S1 ('MetaSel ('Just "csrf_token") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "email") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text))))

data CompleteSelfServiceSettingsFlowWithPasswordMethod Source #

 

Constructors

CompleteSelfServiceSettingsFlowWithPasswordMethod 

Fields

Instances

Instances details
Eq CompleteSelfServiceSettingsFlowWithPasswordMethod Source # 
Instance details

Defined in OryKratos.Types.Misc

Data CompleteSelfServiceSettingsFlowWithPasswordMethod Source # 
Instance details

Defined in OryKratos.Types.Misc

Methods

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

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

toConstr :: CompleteSelfServiceSettingsFlowWithPasswordMethod -> Constr #

dataTypeOf :: CompleteSelfServiceSettingsFlowWithPasswordMethod -> DataType #

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

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

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

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

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

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

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

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

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

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

Show CompleteSelfServiceSettingsFlowWithPasswordMethod Source # 
Instance details

Defined in OryKratos.Types.Misc

Generic CompleteSelfServiceSettingsFlowWithPasswordMethod Source # 
Instance details

Defined in OryKratos.Types.Misc

ToJSON CompleteSelfServiceSettingsFlowWithPasswordMethod Source # 
Instance details

Defined in OryKratos.Types.Misc

FromJSON CompleteSelfServiceSettingsFlowWithPasswordMethod Source # 
Instance details

Defined in OryKratos.Types.Misc

type Rep CompleteSelfServiceSettingsFlowWithPasswordMethod Source # 
Instance details

Defined in OryKratos.Types.Misc

type Rep CompleteSelfServiceSettingsFlowWithPasswordMethod = D1 ('MetaData "CompleteSelfServiceSettingsFlowWithPasswordMethod" "OryKratos.Types.Misc" "ory-kratos-0.0.5.10-7toMqH0VmKGIuO2284toHo" 'False) (C1 ('MetaCons "CompleteSelfServiceSettingsFlowWithPasswordMethod" 'PrefixI 'True) (S1 ('MetaSel ('Just "csrf_token") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "password") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

data CompleteSelfServiceVerificationFlowWithLinkMethod Source #

 

Constructors

CompleteSelfServiceVerificationFlowWithLinkMethod 

Fields

  • csrf_token :: Maybe Text

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

  • email :: Maybe 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 in: body

Instances

Instances details
Eq CompleteSelfServiceVerificationFlowWithLinkMethod Source # 
Instance details

Defined in OryKratos.Types.Misc

Data CompleteSelfServiceVerificationFlowWithLinkMethod Source # 
Instance details

Defined in OryKratos.Types.Misc

Methods

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

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

toConstr :: CompleteSelfServiceVerificationFlowWithLinkMethod -> Constr #

dataTypeOf :: CompleteSelfServiceVerificationFlowWithLinkMethod -> DataType #

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

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

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

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

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

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

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

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

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

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

Show CompleteSelfServiceVerificationFlowWithLinkMethod Source # 
Instance details

Defined in OryKratos.Types.Misc

Generic CompleteSelfServiceVerificationFlowWithLinkMethod Source # 
Instance details

Defined in OryKratos.Types.Misc

ToJSON CompleteSelfServiceVerificationFlowWithLinkMethod Source # 
Instance details

Defined in OryKratos.Types.Misc

FromJSON CompleteSelfServiceVerificationFlowWithLinkMethod Source # 
Instance details

Defined in OryKratos.Types.Misc

type Rep CompleteSelfServiceVerificationFlowWithLinkMethod Source # 
Instance details

Defined in OryKratos.Types.Misc

type Rep CompleteSelfServiceVerificationFlowWithLinkMethod = D1 ('MetaData "CompleteSelfServiceVerificationFlowWithLinkMethod" "OryKratos.Types.Misc" "ory-kratos-0.0.5.10-7toMqH0VmKGIuO2284toHo" 'False) (C1 ('MetaCons "CompleteSelfServiceVerificationFlowWithLinkMethod" 'PrefixI 'True) (S1 ('MetaSel ('Just "csrf_token") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "email") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text))))

data CreateIdentity Source #

 

Constructors

CreateIdentity 

Fields

  • schema_id :: Text

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

  • 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_url:Identity.

Instances

Instances details
Eq CreateIdentity Source # 
Instance details

Defined in OryKratos.Types.Misc

Data CreateIdentity Source # 
Instance details

Defined in OryKratos.Types.Misc

Methods

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

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

toConstr :: CreateIdentity -> Constr #

dataTypeOf :: CreateIdentity -> DataType #

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

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

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

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

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

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

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

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

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

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

Show CreateIdentity Source # 
Instance details

Defined in OryKratos.Types.Misc

Generic CreateIdentity Source # 
Instance details

Defined in OryKratos.Types.Misc

Associated Types

type Rep CreateIdentity :: Type -> Type #

ToJSON CreateIdentity Source # 
Instance details

Defined in OryKratos.Types.Misc

FromJSON CreateIdentity Source # 
Instance details

Defined in OryKratos.Types.Misc

type Rep CreateIdentity Source # 
Instance details

Defined in OryKratos.Types.Misc

type Rep CreateIdentity = D1 ('MetaData "CreateIdentity" "OryKratos.Types.Misc" "ory-kratos-0.0.5.10-7toMqH0VmKGIuO2284toHo" 'False) (C1 ('MetaCons "CreateIdentity" 'PrefixI 'True) (S1 ('MetaSel ('Just "schema_id") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "traits") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Value)))

data CreateRecoveryLink Source #

 

Constructors

CreateRecoveryLink 

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 :: UUID
     

Instances

data Identity Source #

 

Constructors

Identity 

Fields

Instances

Instances details
Eq Identity Source # 
Instance details

Defined in OryKratos.Types.Misc

Data Identity Source # 
Instance details

Defined in OryKratos.Types.Misc

Methods

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

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

toConstr :: Identity -> Constr #

dataTypeOf :: Identity -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Identity Source # 
Instance details

Defined in OryKratos.Types.Misc

Generic Identity Source # 
Instance details

Defined in OryKratos.Types.Misc

Associated Types

type Rep Identity :: Type -> Type #

Methods

from :: Identity -> Rep Identity x #

to :: Rep Identity x -> Identity #

ToJSON Identity Source # 
Instance details

Defined in OryKratos.Types.Misc

FromJSON Identity Source # 
Instance details

Defined in OryKratos.Types.Misc

type Rep Identity Source # 
Instance details

Defined in OryKratos.Types.Misc

data RevokeSession Source #

 

Constructors

RevokeSession 

Fields

Instances

Instances details
Eq RevokeSession Source # 
Instance details

Defined in OryKratos.Types.Misc

Data RevokeSession Source # 
Instance details

Defined in OryKratos.Types.Misc

Methods

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

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

toConstr :: RevokeSession -> Constr #

dataTypeOf :: RevokeSession -> DataType #

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

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

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

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

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

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

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

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

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

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

Show RevokeSession Source # 
Instance details

Defined in OryKratos.Types.Misc

Generic RevokeSession Source # 
Instance details

Defined in OryKratos.Types.Misc

Associated Types

type Rep RevokeSession :: Type -> Type #

ToJSON RevokeSession Source # 
Instance details

Defined in OryKratos.Types.Misc

FromJSON RevokeSession Source # 
Instance details

Defined in OryKratos.Types.Misc

type Rep RevokeSession Source # 
Instance details

Defined in OryKratos.Types.Misc

type Rep RevokeSession = D1 ('MetaData "RevokeSession" "OryKratos.Types.Misc" "ory-kratos-0.0.5.10-7toMqH0VmKGIuO2284toHo" 'False) (C1 ('MetaCons "RevokeSession" 'PrefixI 'True) (S1 ('MetaSel ('Just "session_token") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

data Session Source #

 

Instances

Instances details
Eq Session Source # 
Instance details

Defined in OryKratos.Types.Misc

Methods

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

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

Data Session Source # 
Instance details

Defined in OryKratos.Types.Misc

Methods

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

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

toConstr :: Session -> Constr #

dataTypeOf :: Session -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Session Source # 
Instance details

Defined in OryKratos.Types.Misc

Generic Session Source # 
Instance details

Defined in OryKratos.Types.Misc

Associated Types

type Rep Session :: Type -> Type #

Methods

from :: Session -> Rep Session x #

to :: Rep Session x -> Session #

ToJSON Session Source # 
Instance details

Defined in OryKratos.Types.Misc

FromJSON Session Source # 
Instance details

Defined in OryKratos.Types.Misc

type Rep Session Source # 
Instance details

Defined in OryKratos.Types.Misc

data UpdateIdentity Source #

 

Constructors

UpdateIdentity 

Fields

  • schema_id :: Maybe 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.

  • 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:CreateIdentity.

Instances

Instances details
Eq UpdateIdentity Source # 
Instance details

Defined in OryKratos.Types.Misc

Data UpdateIdentity Source # 
Instance details

Defined in OryKratos.Types.Misc

Methods

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

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

toConstr :: UpdateIdentity -> Constr #

dataTypeOf :: UpdateIdentity -> DataType #

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

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

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

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

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

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

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

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

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

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

Show UpdateIdentity Source # 
Instance details

Defined in OryKratos.Types.Misc

Generic UpdateIdentity Source # 
Instance details

Defined in OryKratos.Types.Misc

Associated Types

type Rep UpdateIdentity :: Type -> Type #

ToJSON UpdateIdentity Source # 
Instance details

Defined in OryKratos.Types.Misc

FromJSON UpdateIdentity Source # 
Instance details

Defined in OryKratos.Types.Misc

type Rep UpdateIdentity Source # 
Instance details

Defined in OryKratos.Types.Misc

type Rep UpdateIdentity = D1 ('MetaData "UpdateIdentity" "OryKratos.Types.Misc" "ory-kratos-0.0.5.10-7toMqH0VmKGIuO2284toHo" 'False) (C1 ('MetaCons "UpdateIdentity" 'PrefixI 'True) (S1 ('MetaSel ('Just "schema_id") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "traits") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Value)))

data VerifiableAddress Source #

 

Constructors

VerifiableAddress 

Instances

Instances details
Eq VerifiableAddress Source # 
Instance details

Defined in OryKratos.Types.Misc

Data VerifiableAddress Source # 
Instance details

Defined in OryKratos.Types.Misc

Methods

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

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

toConstr :: VerifiableAddress -> Constr #

dataTypeOf :: VerifiableAddress -> DataType #

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

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

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

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

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

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

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

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

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

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

Show VerifiableAddress Source # 
Instance details

Defined in OryKratos.Types.Misc

Generic VerifiableAddress Source # 
Instance details

Defined in OryKratos.Types.Misc

Associated Types

type Rep VerifiableAddress :: Type -> Type #

ToJSON VerifiableAddress Source # 
Instance details

Defined in OryKratos.Types.Misc

FromJSON VerifiableAddress Source # 
Instance details

Defined in OryKratos.Types.Misc

type Rep VerifiableAddress Source # 
Instance details

Defined in OryKratos.Types.Misc

data Version Source #

 

Constructors

Version 

Fields

Instances

Instances details
Eq Version Source # 
Instance details

Defined in OryKratos.Types.Misc

Methods

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

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

Data Version Source # 
Instance details

Defined in OryKratos.Types.Misc

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.Misc

Generic Version Source # 
Instance details

Defined in OryKratos.Types.Misc

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.Misc

FromJSON Version Source # 
Instance details

Defined in OryKratos.Types.Misc

type Rep Version Source # 
Instance details

Defined in OryKratos.Types.Misc

type Rep Version = D1 ('MetaData "Version" "OryKratos.Types.Misc" "ory-kratos-0.0.5.10-7toMqH0VmKGIuO2284toHo" 'False) (C1 ('MetaCons "Version" 'PrefixI 'True) (S1 ('MetaSel ('Just "version") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text))))

data RecoveryAddress Source #

 

Constructors

RecoveryAddress 

Fields

Instances

Instances details
Eq RecoveryAddress Source # 
Instance details

Defined in OryKratos.Types.Misc

Data RecoveryAddress Source # 
Instance details

Defined in OryKratos.Types.Misc

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.Misc

Generic RecoveryAddress Source # 
Instance details

Defined in OryKratos.Types.Misc

Associated Types

type Rep RecoveryAddress :: Type -> Type #

ToJSON RecoveryAddress Source # 
Instance details

Defined in OryKratos.Types.Misc

FromJSON RecoveryAddress Source # 
Instance details

Defined in OryKratos.Types.Misc

type Rep RecoveryAddress Source # 
Instance details

Defined in OryKratos.Types.Misc

type Rep RecoveryAddress = D1 ('MetaData "RecoveryAddress" "OryKratos.Types.Misc" "ory-kratos-0.0.5.10-7toMqH0VmKGIuO2284toHo" 'False) (C1 ('MetaCons "RecoveryAddress" 'PrefixI 'True) (S1 ('MetaSel ('Just "id") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UUID) :*: (S1 ('MetaSel ('Just "value") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "via") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text))))

data RecoveryFlow Source #

This request is used when an identity wants to recover their account. We recommend reading the Account Recovery Documentation

Constructors

RecoveryFlow 

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.

  • messages :: Maybe [Message]
     
  • methods :: RecoveryFlowMethods

    Methods contains context for all account recovery methods. If a registration request has been processed, but for example the password is incorrect, this will contain error messages.

  • 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.

  • state :: Text
     
  • _type :: Maybe Text

    The flow type can either be api or browser.

Instances

Instances details
Eq RecoveryFlow Source # 
Instance details

Defined in OryKratos.Types.Recovery

Data RecoveryFlow Source # 
Instance details

Defined in OryKratos.Types.Recovery

Methods

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

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

toConstr :: RecoveryFlow -> Constr #

dataTypeOf :: RecoveryFlow -> DataType #

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

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

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

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

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

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

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

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

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

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

Show RecoveryFlow Source # 
Instance details

Defined in OryKratos.Types.Recovery

Generic RecoveryFlow Source # 
Instance details

Defined in OryKratos.Types.Recovery

Associated Types

type Rep RecoveryFlow :: Type -> Type #

ToJSON RecoveryFlow Source # 
Instance details

Defined in OryKratos.Types.Recovery

FromJSON RecoveryFlow Source # 
Instance details

Defined in OryKratos.Types.Recovery

type Rep RecoveryFlow Source # 
Instance details

Defined in OryKratos.Types.Recovery

data RecoveryFlowMethods Source #

 

Instances

Instances details
Eq RecoveryFlowMethods Source # 
Instance details

Defined in OryKratos.Types.Recovery

Data RecoveryFlowMethods Source # 
Instance details

Defined in OryKratos.Types.Recovery

Methods

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

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

toConstr :: RecoveryFlowMethods -> Constr #

dataTypeOf :: RecoveryFlowMethods -> DataType #

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

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

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

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

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

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

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

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

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

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

Show RecoveryFlowMethods Source # 
Instance details

Defined in OryKratos.Types.Recovery

Generic RecoveryFlowMethods Source # 
Instance details

Defined in OryKratos.Types.Recovery

Associated Types

type Rep RecoveryFlowMethods :: Type -> Type #

ToJSON RecoveryFlowMethods Source # 
Instance details

Defined in OryKratos.Types.Recovery

FromJSON RecoveryFlowMethods Source # 
Instance details

Defined in OryKratos.Types.Recovery

type Rep RecoveryFlowMethods Source # 
Instance details

Defined in OryKratos.Types.Recovery

type Rep RecoveryFlowMethods = D1 ('MetaData "RecoveryFlowMethods" "OryKratos.Types.Recovery" "ory-kratos-0.0.5.10-7toMqH0VmKGIuO2284toHo" 'False) (C1 ('MetaCons "RecoveryFlowMethods" 'PrefixI 'True) (S1 ('MetaSel ('Just "link") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe RecoveryFlowMethod))))

data RecoveryFlowMethod Source #

 

Constructors

RecoveryFlowMethod 

Fields

Instances

Instances details
Eq RecoveryFlowMethod Source # 
Instance details

Defined in OryKratos.Types.Recovery

Data RecoveryFlowMethod Source # 
Instance details

Defined in OryKratos.Types.Recovery

Methods

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

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

toConstr :: RecoveryFlowMethod -> Constr #

dataTypeOf :: RecoveryFlowMethod -> DataType #

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

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

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

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

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

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

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

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

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

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

Show RecoveryFlowMethod Source # 
Instance details

Defined in OryKratos.Types.Recovery

Generic RecoveryFlowMethod Source # 
Instance details

Defined in OryKratos.Types.Recovery

Associated Types

type Rep RecoveryFlowMethod :: Type -> Type #

ToJSON RecoveryFlowMethod Source # 
Instance details

Defined in OryKratos.Types.Recovery

FromJSON RecoveryFlowMethod Source # 
Instance details

Defined in OryKratos.Types.Recovery

type Rep RecoveryFlowMethod Source # 
Instance details

Defined in OryKratos.Types.Recovery

type Rep RecoveryFlowMethod = D1 ('MetaData "RecoveryFlowMethod" "OryKratos.Types.Recovery" "ory-kratos-0.0.5.10-7toMqH0VmKGIuO2284toHo" 'False) (C1 ('MetaCons "RecoveryFlowMethod" 'PrefixI 'True) (S1 ('MetaSel ('Just "config") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RecoveryFlowMethodConfig) :*: S1 ('MetaSel ('Just "method") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

data RecoveryFlowMethodConfig Source #

 

Constructors

RecoveryFlowMethodConfig 

Fields

Instances

Instances details
Eq RecoveryFlowMethodConfig Source # 
Instance details

Defined in OryKratos.Types.Recovery

Data RecoveryFlowMethodConfig Source # 
Instance details

Defined in OryKratos.Types.Recovery

Methods

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

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

toConstr :: RecoveryFlowMethodConfig -> Constr #

dataTypeOf :: RecoveryFlowMethodConfig -> DataType #

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

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

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

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

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

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

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

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

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

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

Show RecoveryFlowMethodConfig Source # 
Instance details

Defined in OryKratos.Types.Recovery

Generic RecoveryFlowMethodConfig Source # 
Instance details

Defined in OryKratos.Types.Recovery

Associated Types

type Rep RecoveryFlowMethodConfig :: Type -> Type #

ToJSON RecoveryFlowMethodConfig Source # 
Instance details

Defined in OryKratos.Types.Recovery

FromJSON RecoveryFlowMethodConfig Source # 
Instance details

Defined in OryKratos.Types.Recovery

type Rep RecoveryFlowMethodConfig Source # 
Instance details

Defined in OryKratos.Types.Recovery

type Rep RecoveryFlowMethodConfig = D1 ('MetaData "RecoveryFlowMethodConfig" "OryKratos.Types.Recovery" "ory-kratos-0.0.5.10-7toMqH0VmKGIuO2284toHo" 'False) (C1 ('MetaCons "RecoveryFlowMethodConfig" 'PrefixI 'True) ((S1 ('MetaSel ('Just "action") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "fields") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FormField])) :*: (S1 ('MetaSel ('Just "messages") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe [Message])) :*: S1 ('MetaSel ('Just "method") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text))))

data RecoveryLink Source #

 

Constructors

RecoveryLink 

Fields

Instances

data RegistrationFlow Source #

 

Constructors

RegistrationFlow 

Fields

  • active :: Maybe Text

    and so on.

  • expires_at :: UTCTime

    ExpiresAt is the time (UTC) when the flow expires. If the user still wishes to log in, a new flow has to be initiated.

  • id :: UUID
     
  • issued_at :: UTCTime

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

  • messages :: Maybe [Message]
     
  • methods :: RegistrationFlowMethods

    Methods contains context for all enabled registration methods. If a registration flow has been processed, but for example the password is incorrect, this will contain error messages.

  • 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.

  • _type :: Maybe Text

    The flow type can either be api or browser.

Instances

Instances details
Eq RegistrationFlow Source # 
Instance details

Defined in OryKratos.Types.Registration

Data RegistrationFlow Source # 
Instance details

Defined in OryKratos.Types.Registration

Methods

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

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

toConstr :: RegistrationFlow -> Constr #

dataTypeOf :: RegistrationFlow -> DataType #

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

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

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

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

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

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

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

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

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

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

Show RegistrationFlow Source # 
Instance details

Defined in OryKratos.Types.Registration

Generic RegistrationFlow Source # 
Instance details

Defined in OryKratos.Types.Registration

Associated Types

type Rep RegistrationFlow :: Type -> Type #

ToJSON RegistrationFlow Source # 
Instance details

Defined in OryKratos.Types.Registration

FromJSON RegistrationFlow Source # 
Instance details

Defined in OryKratos.Types.Registration

type Rep RegistrationFlow Source # 
Instance details

Defined in OryKratos.Types.Registration

data RegistrationFlowMethods Source #

 

Instances

Instances details
Eq RegistrationFlowMethods Source # 
Instance details

Defined in OryKratos.Types.Registration

Data RegistrationFlowMethods Source # 
Instance details

Defined in OryKratos.Types.Registration

Methods

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

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

toConstr :: RegistrationFlowMethods -> Constr #

dataTypeOf :: RegistrationFlowMethods -> DataType #

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

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

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

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

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

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

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

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

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

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

Show RegistrationFlowMethods Source # 
Instance details

Defined in OryKratos.Types.Registration

Generic RegistrationFlowMethods Source # 
Instance details

Defined in OryKratos.Types.Registration

Associated Types

type Rep RegistrationFlowMethods :: Type -> Type #

ToJSON RegistrationFlowMethods Source # 
Instance details

Defined in OryKratos.Types.Registration

FromJSON RegistrationFlowMethods Source # 
Instance details

Defined in OryKratos.Types.Registration

type Rep RegistrationFlowMethods Source # 
Instance details

Defined in OryKratos.Types.Registration

type Rep RegistrationFlowMethods = D1 ('MetaData "RegistrationFlowMethods" "OryKratos.Types.Registration" "ory-kratos-0.0.5.10-7toMqH0VmKGIuO2284toHo" 'False) (C1 ('MetaCons "RegistrationFlowMethods" 'PrefixI 'True) (S1 ('MetaSel ('Just "password") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe RegistrationFlowMethod)) :*: S1 ('MetaSel ('Just "oidc") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe RegistrationFlowMethod))))

data RegistrationFlowMethod Source #

 

Instances

Instances details
Eq RegistrationFlowMethod Source # 
Instance details

Defined in OryKratos.Types.Registration

Data RegistrationFlowMethod Source # 
Instance details

Defined in OryKratos.Types.Registration

Methods

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

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

toConstr :: RegistrationFlowMethod -> Constr #

dataTypeOf :: RegistrationFlowMethod -> DataType #

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

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

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

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

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

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

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

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

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

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

Show RegistrationFlowMethod Source # 
Instance details

Defined in OryKratos.Types.Registration

Generic RegistrationFlowMethod Source # 
Instance details

Defined in OryKratos.Types.Registration

Associated Types

type Rep RegistrationFlowMethod :: Type -> Type #

ToJSON RegistrationFlowMethod Source # 
Instance details

Defined in OryKratos.Types.Registration

FromJSON RegistrationFlowMethod Source # 
Instance details

Defined in OryKratos.Types.Registration

type Rep RegistrationFlowMethod Source # 
Instance details

Defined in OryKratos.Types.Registration

type Rep RegistrationFlowMethod = D1 ('MetaData "RegistrationFlowMethod" "OryKratos.Types.Registration" "ory-kratos-0.0.5.10-7toMqH0VmKGIuO2284toHo" 'False) (C1 ('MetaCons "RegistrationFlowMethod" 'PrefixI 'True) (S1 ('MetaSel ('Just "config") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RegistrationFlowMethodConfig) :*: S1 ('MetaSel ('Just "method") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

data RegistrationFlowMethodConfig Source #

 

Constructors

RegistrationFlowMethodConfig 

Fields

Instances

Instances details
Eq RegistrationFlowMethodConfig Source # 
Instance details

Defined in OryKratos.Types.Registration

Data RegistrationFlowMethodConfig Source # 
Instance details

Defined in OryKratos.Types.Registration

Methods

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

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

toConstr :: RegistrationFlowMethodConfig -> Constr #

dataTypeOf :: RegistrationFlowMethodConfig -> DataType #

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

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

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

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

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

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

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

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

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

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

Show RegistrationFlowMethodConfig Source # 
Instance details

Defined in OryKratos.Types.Registration

Generic RegistrationFlowMethodConfig Source # 
Instance details

Defined in OryKratos.Types.Registration

Associated Types

type Rep RegistrationFlowMethodConfig :: Type -> Type #

ToJSON RegistrationFlowMethodConfig Source # 
Instance details

Defined in OryKratos.Types.Registration

FromJSON RegistrationFlowMethodConfig Source # 
Instance details

Defined in OryKratos.Types.Registration

type Rep RegistrationFlowMethodConfig Source # 
Instance details

Defined in OryKratos.Types.Registration

type Rep RegistrationFlowMethodConfig = D1 ('MetaData "RegistrationFlowMethodConfig" "OryKratos.Types.Registration" "ory-kratos-0.0.5.10-7toMqH0VmKGIuO2284toHo" 'False) (C1 ('MetaCons "RegistrationFlowMethodConfig" 'PrefixI 'True) ((S1 ('MetaSel ('Just "action") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "fields") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FormField])) :*: (S1 ('MetaSel ('Just "messages") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe [Message])) :*: (S1 ('MetaSel ('Just "method") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "providers") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe [FormField]))))))

data RegistrationViaApiResponse Source #

The Response for Registration Flows via API

Constructors

RegistrationViaApiResponse 

Fields

  • identity :: Identity
     
  • session :: Maybe Session
     
  • session_token :: 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 RegistrationViaApiResponse Source # 
Instance details

Defined in OryKratos.Types.Registration

Data RegistrationViaApiResponse Source # 
Instance details

Defined in OryKratos.Types.Registration

Methods

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

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

toConstr :: RegistrationViaApiResponse -> Constr #

dataTypeOf :: RegistrationViaApiResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show RegistrationViaApiResponse Source # 
Instance details

Defined in OryKratos.Types.Registration

Generic RegistrationViaApiResponse Source # 
Instance details

Defined in OryKratos.Types.Registration

Associated Types

type Rep RegistrationViaApiResponse :: Type -> Type #

ToJSON RegistrationViaApiResponse Source # 
Instance details

Defined in OryKratos.Types.Registration

FromJSON RegistrationViaApiResponse Source # 
Instance details

Defined in OryKratos.Types.Registration

type Rep RegistrationViaApiResponse Source # 
Instance details

Defined in OryKratos.Types.Registration

type Rep RegistrationViaApiResponse = D1 ('MetaData "RegistrationViaApiResponse" "OryKratos.Types.Registration" "ory-kratos-0.0.5.10-7toMqH0VmKGIuO2284toHo" 'False) (C1 ('MetaCons "RegistrationViaApiResponse" 'PrefixI 'True) (S1 ('MetaSel ('Just "identity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Identity) :*: (S1 ('MetaSel ('Just "session") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Session)) :*: S1 ('MetaSel ('Just "session_token") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text))))

data SettingsFlow 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

SettingsFlow 

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 flow expires. If the user still wishes to update the setting, a new flow has to be initiated.

  • id :: UUID
     
  • identity :: Identity
     
  • issued_at :: UTCTime

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

  • messages :: Maybe [Message]
     
  • methods :: SettingsFlowMethods

    Methods contains context for all enabled registration methods. If a settings flow has been processed, but for example the first name is empty, this will contain error messages.

  • 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.

  • state :: Text
     
  • _type :: Maybe Text

    The flow type can either be api or browser.

Instances

Instances details
Eq SettingsFlow Source # 
Instance details

Defined in OryKratos.Types.Settings

Data SettingsFlow Source # 
Instance details

Defined in OryKratos.Types.Settings

Methods

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

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

toConstr :: SettingsFlow -> Constr #

dataTypeOf :: SettingsFlow -> DataType #

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

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

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

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

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

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

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

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

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

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

Show SettingsFlow Source # 
Instance details

Defined in OryKratos.Types.Settings

Generic SettingsFlow Source # 
Instance details

Defined in OryKratos.Types.Settings

Associated Types

type Rep SettingsFlow :: Type -> Type #

ToJSON SettingsFlow Source # 
Instance details

Defined in OryKratos.Types.Settings

FromJSON SettingsFlow Source # 
Instance details

Defined in OryKratos.Types.Settings

type Rep SettingsFlow Source # 
Instance details

Defined in OryKratos.Types.Settings

data SettingsFlowMethods Source #

 

Instances

Instances details
Eq SettingsFlowMethods Source # 
Instance details

Defined in OryKratos.Types.Settings

Data SettingsFlowMethods Source # 
Instance details

Defined in OryKratos.Types.Settings

Methods

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

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

toConstr :: SettingsFlowMethods -> Constr #

dataTypeOf :: SettingsFlowMethods -> DataType #

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

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

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

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

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

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

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

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

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

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

Show SettingsFlowMethods Source # 
Instance details

Defined in OryKratos.Types.Settings

Generic SettingsFlowMethods Source # 
Instance details

Defined in OryKratos.Types.Settings

Associated Types

type Rep SettingsFlowMethods :: Type -> Type #

ToJSON SettingsFlowMethods Source # 
Instance details

Defined in OryKratos.Types.Settings

FromJSON SettingsFlowMethods Source # 
Instance details

Defined in OryKratos.Types.Settings

type Rep SettingsFlowMethods Source # 
Instance details

Defined in OryKratos.Types.Settings

type Rep SettingsFlowMethods = D1 ('MetaData "SettingsFlowMethods" "OryKratos.Types.Settings" "ory-kratos-0.0.5.10-7toMqH0VmKGIuO2284toHo" 'False) (C1 ('MetaCons "SettingsFlowMethods" 'PrefixI 'True) (S1 ('MetaSel ('Just "profile") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe SettingsFlowMethod)) :*: (S1 ('MetaSel ('Just "password") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe SettingsFlowMethod)) :*: S1 ('MetaSel ('Just "oidc") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe SettingsFlowMethod)))))

data SettingsFlowMethod Source #

 

Constructors

SettingsFlowMethod 

Fields

Instances

Instances details
Eq SettingsFlowMethod Source # 
Instance details

Defined in OryKratos.Types.Settings

Data SettingsFlowMethod Source # 
Instance details

Defined in OryKratos.Types.Settings

Methods

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

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

toConstr :: SettingsFlowMethod -> Constr #

dataTypeOf :: SettingsFlowMethod -> DataType #

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

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

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

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

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

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

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

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

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

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

Show SettingsFlowMethod Source # 
Instance details

Defined in OryKratos.Types.Settings

Generic SettingsFlowMethod Source # 
Instance details

Defined in OryKratos.Types.Settings

Associated Types

type Rep SettingsFlowMethod :: Type -> Type #

ToJSON SettingsFlowMethod Source # 
Instance details

Defined in OryKratos.Types.Settings

FromJSON SettingsFlowMethod Source # 
Instance details

Defined in OryKratos.Types.Settings

type Rep SettingsFlowMethod Source # 
Instance details

Defined in OryKratos.Types.Settings

type Rep SettingsFlowMethod = D1 ('MetaData "SettingsFlowMethod" "OryKratos.Types.Settings" "ory-kratos-0.0.5.10-7toMqH0VmKGIuO2284toHo" 'False) (C1 ('MetaCons "SettingsFlowMethod" 'PrefixI 'True) (S1 ('MetaSel ('Just "config") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SettingsFlowMethodConfig) :*: S1 ('MetaSel ('Just "method") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

data SettingsFlowMethodConfig Source #

 

Constructors

SettingsFlowMethodConfig 

Fields

Instances

Instances details
Eq SettingsFlowMethodConfig Source # 
Instance details

Defined in OryKratos.Types.Settings

Data SettingsFlowMethodConfig Source # 
Instance details

Defined in OryKratos.Types.Settings

Methods

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

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

toConstr :: SettingsFlowMethodConfig -> Constr #

dataTypeOf :: SettingsFlowMethodConfig -> DataType #

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

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

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

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

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

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

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

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

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

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

Show SettingsFlowMethodConfig Source # 
Instance details

Defined in OryKratos.Types.Settings

Generic SettingsFlowMethodConfig Source # 
Instance details

Defined in OryKratos.Types.Settings

Associated Types

type Rep SettingsFlowMethodConfig :: Type -> Type #

ToJSON SettingsFlowMethodConfig Source # 
Instance details

Defined in OryKratos.Types.Settings

FromJSON SettingsFlowMethodConfig Source # 
Instance details

Defined in OryKratos.Types.Settings

type Rep SettingsFlowMethodConfig Source # 
Instance details

Defined in OryKratos.Types.Settings

type Rep SettingsFlowMethodConfig = D1 ('MetaData "SettingsFlowMethodConfig" "OryKratos.Types.Settings" "ory-kratos-0.0.5.10-7toMqH0VmKGIuO2284toHo" 'False) (C1 ('MetaCons "SettingsFlowMethodConfig" 'PrefixI 'True) ((S1 ('MetaSel ('Just "action") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "fields") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FormField])) :*: (S1 ('MetaSel ('Just "messages") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe [Message])) :*: S1 ('MetaSel ('Just "method") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text))))

data SettingsViaApiResponse Source #

The Response for Settings Flows via API

Instances

Instances details
Eq SettingsViaApiResponse Source # 
Instance details

Defined in OryKratos.Types.Settings

Data SettingsViaApiResponse Source # 
Instance details

Defined in OryKratos.Types.Settings

Methods

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

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

toConstr :: SettingsViaApiResponse -> Constr #

dataTypeOf :: SettingsViaApiResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show SettingsViaApiResponse Source # 
Instance details

Defined in OryKratos.Types.Settings

Generic SettingsViaApiResponse Source # 
Instance details

Defined in OryKratos.Types.Settings

Associated Types

type Rep SettingsViaApiResponse :: Type -> Type #

ToJSON SettingsViaApiResponse Source # 
Instance details

Defined in OryKratos.Types.Settings

FromJSON SettingsViaApiResponse Source # 
Instance details

Defined in OryKratos.Types.Settings

type Rep SettingsViaApiResponse Source # 
Instance details

Defined in OryKratos.Types.Settings

type Rep SettingsViaApiResponse = D1 ('MetaData "SettingsViaApiResponse" "OryKratos.Types.Settings" "ory-kratos-0.0.5.10-7toMqH0VmKGIuO2284toHo" 'False) (C1 ('MetaCons "SettingsViaApiResponse" 'PrefixI 'True) (S1 ('MetaSel ('Just "flow") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SettingsFlow) :*: S1 ('MetaSel ('Just "identity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Identity)))

data VerificationFlow 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

VerificationFlow 

Fields

  • active :: Maybe Text

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

  • expires_at :: Maybe UTCTime

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

  • id :: Maybe UUID
     
  • issued_at :: Maybe UTCTime

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

  • messages :: Maybe [Message]
     
  • methods :: Map String VerificationFlowMethod

    Methods contains context for all account verification methods. If a registration request has been processed, but for example the password is incorrect, this will contain error messages.

  • request_url :: Maybe 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.

  • state :: Text
     
  • _type :: Maybe Text

    The flow type can either be api or browser.

Instances

Instances details
Eq VerificationFlow Source # 
Instance details

Defined in OryKratos.Types.Verification

Data VerificationFlow Source # 
Instance details

Defined in OryKratos.Types.Verification

Methods

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

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

toConstr :: VerificationFlow -> Constr #

dataTypeOf :: VerificationFlow -> DataType #

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

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

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

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

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

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

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

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

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

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

Show VerificationFlow Source # 
Instance details

Defined in OryKratos.Types.Verification

Generic VerificationFlow Source # 
Instance details

Defined in OryKratos.Types.Verification

Associated Types

type Rep VerificationFlow :: Type -> Type #

ToJSON VerificationFlow Source # 
Instance details

Defined in OryKratos.Types.Verification

FromJSON VerificationFlow Source # 
Instance details

Defined in OryKratos.Types.Verification

type Rep VerificationFlow Source # 
Instance details

Defined in OryKratos.Types.Verification

data VerificationFlowMethods Source #

 

Instances

Instances details
Eq VerificationFlowMethods Source # 
Instance details

Defined in OryKratos.Types.Verification

Data VerificationFlowMethods Source # 
Instance details

Defined in OryKratos.Types.Verification

Methods

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

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

toConstr :: VerificationFlowMethods -> Constr #

dataTypeOf :: VerificationFlowMethods -> DataType #

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

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

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

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

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

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

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

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

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

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

Show VerificationFlowMethods Source # 
Instance details

Defined in OryKratos.Types.Verification

Generic VerificationFlowMethods Source # 
Instance details

Defined in OryKratos.Types.Verification

Associated Types

type Rep VerificationFlowMethods :: Type -> Type #

ToJSON VerificationFlowMethods Source # 
Instance details

Defined in OryKratos.Types.Verification

FromJSON VerificationFlowMethods Source # 
Instance details

Defined in OryKratos.Types.Verification

type Rep VerificationFlowMethods Source # 
Instance details

Defined in OryKratos.Types.Verification

type Rep VerificationFlowMethods = D1 ('MetaData "VerificationFlowMethods" "OryKratos.Types.Verification" "ory-kratos-0.0.5.10-7toMqH0VmKGIuO2284toHo" 'False) (C1 ('MetaCons "VerificationFlowMethods" 'PrefixI 'True) (S1 ('MetaSel ('Just "link") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe VerificationFlowMethod))))

data VerificationFlowMethod Source #

 

Constructors

VerificationFlowMethod 

Fields

Instances

Instances details
Eq VerificationFlowMethod Source # 
Instance details

Defined in OryKratos.Types.Verification

Data VerificationFlowMethod Source # 
Instance details

Defined in OryKratos.Types.Verification

Methods

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

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

toConstr :: VerificationFlowMethod -> Constr #

dataTypeOf :: VerificationFlowMethod -> DataType #

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

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

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

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

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

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

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

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

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

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

Show VerificationFlowMethod Source # 
Instance details

Defined in OryKratos.Types.Verification

Generic VerificationFlowMethod Source # 
Instance details

Defined in OryKratos.Types.Verification

Associated Types

type Rep VerificationFlowMethod :: Type -> Type #

ToJSON VerificationFlowMethod Source # 
Instance details

Defined in OryKratos.Types.Verification

FromJSON VerificationFlowMethod Source # 
Instance details

Defined in OryKratos.Types.Verification

type Rep VerificationFlowMethod Source # 
Instance details

Defined in OryKratos.Types.Verification

type Rep VerificationFlowMethod = D1 ('MetaData "VerificationFlowMethod" "OryKratos.Types.Verification" "ory-kratos-0.0.5.10-7toMqH0VmKGIuO2284toHo" 'False) (C1 ('MetaCons "VerificationFlowMethod" 'PrefixI 'True) (S1 ('MetaSel ('Just "config") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 VerificationFlowMethodConfig) :*: S1 ('MetaSel ('Just "method") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

data VerificationFlowMethodConfig Source #

 

Constructors

VerificationFlowMethodConfig 

Fields

Instances

Instances details
Eq VerificationFlowMethodConfig Source # 
Instance details

Defined in OryKratos.Types.Verification

Data VerificationFlowMethodConfig Source # 
Instance details

Defined in OryKratos.Types.Verification

Methods

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

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

toConstr :: VerificationFlowMethodConfig -> Constr #

dataTypeOf :: VerificationFlowMethodConfig -> DataType #

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

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

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

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

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

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

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

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

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

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

Show VerificationFlowMethodConfig Source # 
Instance details

Defined in OryKratos.Types.Verification

Generic VerificationFlowMethodConfig Source # 
Instance details

Defined in OryKratos.Types.Verification

Associated Types

type Rep VerificationFlowMethodConfig :: Type -> Type #

ToJSON VerificationFlowMethodConfig Source # 
Instance details

Defined in OryKratos.Types.Verification

FromJSON VerificationFlowMethodConfig Source # 
Instance details

Defined in OryKratos.Types.Verification

type Rep VerificationFlowMethodConfig Source # 
Instance details

Defined in OryKratos.Types.Verification

type Rep VerificationFlowMethodConfig = D1 ('MetaData "VerificationFlowMethodConfig" "OryKratos.Types.Verification" "ory-kratos-0.0.5.10-7toMqH0VmKGIuO2284toHo" 'False) (C1 ('MetaCons "VerificationFlowMethodConfig" 'PrefixI 'True) ((S1 ('MetaSel ('Just "action") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "fields") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FormField])) :*: (S1 ('MetaSel ('Just "messages") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe [Message])) :*: S1 ('MetaSel ('Just "method") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text))))