{-# OPTIONS_GHC -fno-warn-unused-binds -fno-warn-unused-imports #-}

module OryKratos.Types.Payload
  ( SubmitSelfServiceLoginFlowBody (..),
    SubmitSelfServiceLoginFlowWithLookupSecretMethodBody (..),
    SubmitSelfServiceLoginFlowWithOidcMethodBody (..),
    SubmitSelfServiceLoginFlowWithPasswordMethodBody (..),
    SubmitSelfServiceLoginFlowWithTotpMethodBody (..),
    SubmitSelfServiceLoginFlowWithWebAuthnMethodBody (..),
    SubmitSelfServiceLogoutFlowWithoutBrowserBody (..),
    SubmitSelfServiceRecoveryFlowBody (..),
    SubmitSelfServiceRecoveryFlowWithLinkMethodBody (..),
    SubmitSelfServiceRegistrationFlowBody (..),
    SubmitSelfServiceRegistrationFlowWithOidcMethodBody (..),
    SubmitSelfServiceRegistrationFlowWithPasswordMethodBody (..),
    SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody (..),
    SubmitSelfServiceSettingsFlowBody (..),
    SubmitSelfServiceSettingsFlowWithLookupMethodBody (..),
    SubmitSelfServiceSettingsFlowWithOidcMethodBody (..),
    SubmitSelfServiceSettingsFlowWithPasswordMethodBody (..),
    SubmitSelfServiceSettingsFlowWithProfileMethodBody (..),
    SubmitSelfServiceSettingsFlowWithTotpMethodBody (..),
    SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody (..),
    SubmitSelfServiceVerificationFlowBody (..),
    SubmitSelfServiceVerificationFlowWithLinkMethodBody (..),
  )
where

import Data.Aeson (FromJSON (..), ToJSON (..), Value, genericParseJSON, genericToEncoding, genericToJSON)
import Data.Aeson.Types (Options (..), defaultOptions)
import qualified Data.Char as Char
import Data.Data (Data)
import Data.Function ((&))
import Data.List (stripPrefix)
import qualified Data.Map as Map
import Data.Maybe (fromMaybe)
import Data.Set (Set)
import Data.Swagger (ToSchema, declareNamedSchema)
import qualified Data.Swagger as Swagger
import Data.Text (Text)
import qualified Data.Text as T
import Data.Time
import Data.UUID (UUID)
import GHC.Generics (Generic)
import OryKratos.Types.Helper (removeFieldLabelPrefix)

data SubmitSelfServiceLoginFlowBody = SubmitSelfServiceLoginFlowBody
  { -- | Sending the anti-csrf token is only required for browser login flows.
    SubmitSelfServiceLoginFlowBody -> Maybe Text
csrf_token :: Maybe Text,
    -- | Identifier is the email or username of the user trying to log in. This field is only required when using WebAuthn for passwordless login. When using WebAuthn for multi-factor authentication, it is not needed.
    SubmitSelfServiceLoginFlowBody -> Text
identifier :: Text,
    -- | Method should be set to \"lookup_secret\" when logging in using the lookup_secret strategy.
    SubmitSelfServiceLoginFlowBody -> Text
method :: Text,
    -- | The user's password.
    SubmitSelfServiceLoginFlowBody -> Text
password :: Text,
    -- | Identifier is the email or username of the user trying to log in. This field is deprecated!
    SubmitSelfServiceLoginFlowBody -> Maybe Text
password_identifier :: Maybe Text,
    -- | The provider to register with
    SubmitSelfServiceLoginFlowBody -> Text
provider :: Text,
    -- | The identity traits. This is a placeholder for the registration flow.
    SubmitSelfServiceLoginFlowBody -> Maybe Value
traits :: Maybe Value,
    -- | The TOTP code.
    SubmitSelfServiceLoginFlowBody -> Text
totp_code :: Text,
    -- | Login a WebAuthn Security Key  This must contain the ID of the WebAuthN connection.
    SubmitSelfServiceLoginFlowBody -> Maybe Text
webauthn_login :: Maybe Text,
    -- | The lookup secret.
    SubmitSelfServiceLoginFlowBody -> Text
lookup_secret :: Text
  }
  deriving stock (Int -> SubmitSelfServiceLoginFlowBody -> ShowS
[SubmitSelfServiceLoginFlowBody] -> ShowS
SubmitSelfServiceLoginFlowBody -> String
(Int -> SubmitSelfServiceLoginFlowBody -> ShowS)
-> (SubmitSelfServiceLoginFlowBody -> String)
-> ([SubmitSelfServiceLoginFlowBody] -> ShowS)
-> Show SubmitSelfServiceLoginFlowBody
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [SubmitSelfServiceLoginFlowBody] -> ShowS
$cshowList :: [SubmitSelfServiceLoginFlowBody] -> ShowS
show :: SubmitSelfServiceLoginFlowBody -> String
$cshow :: SubmitSelfServiceLoginFlowBody -> String
showsPrec :: Int -> SubmitSelfServiceLoginFlowBody -> ShowS
$cshowsPrec :: Int -> SubmitSelfServiceLoginFlowBody -> ShowS
Show, SubmitSelfServiceLoginFlowBody
-> SubmitSelfServiceLoginFlowBody -> Bool
(SubmitSelfServiceLoginFlowBody
 -> SubmitSelfServiceLoginFlowBody -> Bool)
-> (SubmitSelfServiceLoginFlowBody
    -> SubmitSelfServiceLoginFlowBody -> Bool)
-> Eq SubmitSelfServiceLoginFlowBody
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: SubmitSelfServiceLoginFlowBody
-> SubmitSelfServiceLoginFlowBody -> Bool
$c/= :: SubmitSelfServiceLoginFlowBody
-> SubmitSelfServiceLoginFlowBody -> Bool
== :: SubmitSelfServiceLoginFlowBody
-> SubmitSelfServiceLoginFlowBody -> Bool
$c== :: SubmitSelfServiceLoginFlowBody
-> SubmitSelfServiceLoginFlowBody -> Bool
Eq, (forall x.
 SubmitSelfServiceLoginFlowBody
 -> Rep SubmitSelfServiceLoginFlowBody x)
-> (forall x.
    Rep SubmitSelfServiceLoginFlowBody x
    -> SubmitSelfServiceLoginFlowBody)
-> Generic SubmitSelfServiceLoginFlowBody
forall x.
Rep SubmitSelfServiceLoginFlowBody x
-> SubmitSelfServiceLoginFlowBody
forall x.
SubmitSelfServiceLoginFlowBody
-> Rep SubmitSelfServiceLoginFlowBody x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep SubmitSelfServiceLoginFlowBody x
-> SubmitSelfServiceLoginFlowBody
$cfrom :: forall x.
SubmitSelfServiceLoginFlowBody
-> Rep SubmitSelfServiceLoginFlowBody x
Generic, Typeable SubmitSelfServiceLoginFlowBody
DataType
Constr
Typeable SubmitSelfServiceLoginFlowBody
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g)
    -> SubmitSelfServiceLoginFlowBody
    -> c SubmitSelfServiceLoginFlowBody)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r)
    -> Constr
    -> c SubmitSelfServiceLoginFlowBody)
-> (SubmitSelfServiceLoginFlowBody -> Constr)
-> (SubmitSelfServiceLoginFlowBody -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d))
    -> Maybe (c SubmitSelfServiceLoginFlowBody))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e))
    -> Maybe (c SubmitSelfServiceLoginFlowBody))
-> ((forall b. Data b => b -> b)
    -> SubmitSelfServiceLoginFlowBody
    -> SubmitSelfServiceLoginFlowBody)
-> (forall r r'.
    (r -> r' -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SubmitSelfServiceLoginFlowBody
    -> r)
-> (forall r r'.
    (r' -> r -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SubmitSelfServiceLoginFlowBody
    -> r)
-> (forall u.
    (forall d. Data d => d -> u)
    -> SubmitSelfServiceLoginFlowBody -> [u])
-> (forall u.
    Int
    -> (forall d. Data d => d -> u)
    -> SubmitSelfServiceLoginFlowBody
    -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceLoginFlowBody
    -> m SubmitSelfServiceLoginFlowBody)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceLoginFlowBody
    -> m SubmitSelfServiceLoginFlowBody)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceLoginFlowBody
    -> m SubmitSelfServiceLoginFlowBody)
-> Data SubmitSelfServiceLoginFlowBody
SubmitSelfServiceLoginFlowBody -> DataType
SubmitSelfServiceLoginFlowBody -> Constr
(forall b. Data b => b -> b)
-> SubmitSelfServiceLoginFlowBody -> SubmitSelfServiceLoginFlowBody
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceLoginFlowBody
-> c SubmitSelfServiceLoginFlowBody
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceLoginFlowBody
forall a.
Typeable a
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g) -> a -> c a)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r) -> Constr -> c a)
-> (a -> Constr)
-> (a -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d)) -> Maybe (c a))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c a))
-> ((forall b. Data b => b -> b) -> a -> a)
-> (forall r r'.
    (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall r r'.
    (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall u. (forall d. Data d => d -> u) -> a -> [u])
-> (forall u. Int -> (forall d. Data d => d -> u) -> a -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> Data a
forall u.
Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceLoginFlowBody
-> u
forall u.
(forall d. Data d => d -> u)
-> SubmitSelfServiceLoginFlowBody -> [u]
forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceLoginFlowBody
-> r
forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceLoginFlowBody
-> r
forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowBody
-> m SubmitSelfServiceLoginFlowBody
forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowBody
-> m SubmitSelfServiceLoginFlowBody
forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceLoginFlowBody
forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceLoginFlowBody
-> c SubmitSelfServiceLoginFlowBody
forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceLoginFlowBody)
forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceLoginFlowBody)
$cSubmitSelfServiceLoginFlowBody :: Constr
$tSubmitSelfServiceLoginFlowBody :: DataType
gmapMo :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowBody
-> m SubmitSelfServiceLoginFlowBody
$cgmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowBody
-> m SubmitSelfServiceLoginFlowBody
gmapMp :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowBody
-> m SubmitSelfServiceLoginFlowBody
$cgmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowBody
-> m SubmitSelfServiceLoginFlowBody
gmapM :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowBody
-> m SubmitSelfServiceLoginFlowBody
$cgmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowBody
-> m SubmitSelfServiceLoginFlowBody
gmapQi :: Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceLoginFlowBody
-> u
$cgmapQi :: forall u.
Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceLoginFlowBody
-> u
gmapQ :: (forall d. Data d => d -> u)
-> SubmitSelfServiceLoginFlowBody -> [u]
$cgmapQ :: forall u.
(forall d. Data d => d -> u)
-> SubmitSelfServiceLoginFlowBody -> [u]
gmapQr :: (r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceLoginFlowBody
-> r
$cgmapQr :: forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceLoginFlowBody
-> r
gmapQl :: (r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceLoginFlowBody
-> r
$cgmapQl :: forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceLoginFlowBody
-> r
gmapT :: (forall b. Data b => b -> b)
-> SubmitSelfServiceLoginFlowBody -> SubmitSelfServiceLoginFlowBody
$cgmapT :: (forall b. Data b => b -> b)
-> SubmitSelfServiceLoginFlowBody -> SubmitSelfServiceLoginFlowBody
dataCast2 :: (forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceLoginFlowBody)
$cdataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceLoginFlowBody)
dataCast1 :: (forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceLoginFlowBody)
$cdataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceLoginFlowBody)
dataTypeOf :: SubmitSelfServiceLoginFlowBody -> DataType
$cdataTypeOf :: SubmitSelfServiceLoginFlowBody -> DataType
toConstr :: SubmitSelfServiceLoginFlowBody -> Constr
$ctoConstr :: SubmitSelfServiceLoginFlowBody -> Constr
gunfold :: (forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceLoginFlowBody
$cgunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceLoginFlowBody
gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceLoginFlowBody
-> c SubmitSelfServiceLoginFlowBody
$cgfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceLoginFlowBody
-> c SubmitSelfServiceLoginFlowBody
$cp1Data :: Typeable SubmitSelfServiceLoginFlowBody
Data)

instance FromJSON SubmitSelfServiceLoginFlowBody

instance ToJSON SubmitSelfServiceLoginFlowBody where
  toEncoding :: SubmitSelfServiceLoginFlowBody -> Encoding
toEncoding = Options -> SubmitSelfServiceLoginFlowBody -> Encoding
forall a.
(Generic a, GToJSON' Encoding Zero (Rep a)) =>
Options -> a -> Encoding
genericToEncoding Options
defaultOptions

data SubmitSelfServiceLoginFlowWithLookupSecretMethodBody = SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
  { -- | Sending the anti-csrf token is only required for browser login flows.
    SubmitSelfServiceLoginFlowWithLookupSecretMethodBody -> Maybe Text
csrf_token :: Maybe Text,
    -- | The lookup secret.
    SubmitSelfServiceLoginFlowWithLookupSecretMethodBody -> Text
lookup_secret :: Text,
    -- | Method should be set to \"lookup_secret\" when logging in using the lookup_secret strategy.
    SubmitSelfServiceLoginFlowWithLookupSecretMethodBody -> Text
method :: Text
  }
  deriving stock (Int
-> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody -> ShowS
[SubmitSelfServiceLoginFlowWithLookupSecretMethodBody] -> ShowS
SubmitSelfServiceLoginFlowWithLookupSecretMethodBody -> String
(Int
 -> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody -> ShowS)
-> (SubmitSelfServiceLoginFlowWithLookupSecretMethodBody -> String)
-> ([SubmitSelfServiceLoginFlowWithLookupSecretMethodBody]
    -> ShowS)
-> Show SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [SubmitSelfServiceLoginFlowWithLookupSecretMethodBody] -> ShowS
$cshowList :: [SubmitSelfServiceLoginFlowWithLookupSecretMethodBody] -> ShowS
show :: SubmitSelfServiceLoginFlowWithLookupSecretMethodBody -> String
$cshow :: SubmitSelfServiceLoginFlowWithLookupSecretMethodBody -> String
showsPrec :: Int
-> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody -> ShowS
$cshowsPrec :: Int
-> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody -> ShowS
Show, SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
-> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody -> Bool
(SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
 -> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody -> Bool)
-> (SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
    -> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody -> Bool)
-> Eq SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
-> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody -> Bool
$c/= :: SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
-> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody -> Bool
== :: SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
-> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody -> Bool
$c== :: SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
-> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody -> Bool
Eq, (forall x.
 SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
 -> Rep SubmitSelfServiceLoginFlowWithLookupSecretMethodBody x)
-> (forall x.
    Rep SubmitSelfServiceLoginFlowWithLookupSecretMethodBody x
    -> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody)
-> Generic SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
forall x.
Rep SubmitSelfServiceLoginFlowWithLookupSecretMethodBody x
-> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
forall x.
SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
-> Rep SubmitSelfServiceLoginFlowWithLookupSecretMethodBody x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep SubmitSelfServiceLoginFlowWithLookupSecretMethodBody x
-> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
$cfrom :: forall x.
SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
-> Rep SubmitSelfServiceLoginFlowWithLookupSecretMethodBody x
Generic, Typeable SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
DataType
Constr
Typeable SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g)
    -> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
    -> c SubmitSelfServiceLoginFlowWithLookupSecretMethodBody)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r)
    -> Constr
    -> c SubmitSelfServiceLoginFlowWithLookupSecretMethodBody)
-> (SubmitSelfServiceLoginFlowWithLookupSecretMethodBody -> Constr)
-> (SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
    -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d))
    -> Maybe (c SubmitSelfServiceLoginFlowWithLookupSecretMethodBody))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e))
    -> Maybe (c SubmitSelfServiceLoginFlowWithLookupSecretMethodBody))
-> ((forall b. Data b => b -> b)
    -> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
    -> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody)
-> (forall r r'.
    (r -> r' -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
    -> r)
-> (forall r r'.
    (r' -> r -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
    -> r)
-> (forall u.
    (forall d. Data d => d -> u)
    -> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody -> [u])
-> (forall u.
    Int
    -> (forall d. Data d => d -> u)
    -> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
    -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
    -> m SubmitSelfServiceLoginFlowWithLookupSecretMethodBody)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
    -> m SubmitSelfServiceLoginFlowWithLookupSecretMethodBody)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
    -> m SubmitSelfServiceLoginFlowWithLookupSecretMethodBody)
-> Data SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
SubmitSelfServiceLoginFlowWithLookupSecretMethodBody -> DataType
SubmitSelfServiceLoginFlowWithLookupSecretMethodBody -> Constr
(forall b. Data b => b -> b)
-> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
-> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
-> c SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
forall a.
Typeable a
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g) -> a -> c a)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r) -> Constr -> c a)
-> (a -> Constr)
-> (a -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d)) -> Maybe (c a))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c a))
-> ((forall b. Data b => b -> b) -> a -> a)
-> (forall r r'.
    (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall r r'.
    (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall u. (forall d. Data d => d -> u) -> a -> [u])
-> (forall u. Int -> (forall d. Data d => d -> u) -> a -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> Data a
forall u.
Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
-> u
forall u.
(forall d. Data d => d -> u)
-> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody -> [u]
forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
-> r
forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
-> r
forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
-> m SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
-> m SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
-> c SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceLoginFlowWithLookupSecretMethodBody)
forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceLoginFlowWithLookupSecretMethodBody)
$cSubmitSelfServiceLoginFlowWithLookupSecretMethodBody :: Constr
$tSubmitSelfServiceLoginFlowWithLookupSecretMethodBody :: DataType
gmapMo :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
-> m SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
$cgmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
-> m SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
gmapMp :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
-> m SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
$cgmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
-> m SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
gmapM :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
-> m SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
$cgmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
-> m SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
gmapQi :: Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
-> u
$cgmapQi :: forall u.
Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
-> u
gmapQ :: (forall d. Data d => d -> u)
-> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody -> [u]
$cgmapQ :: forall u.
(forall d. Data d => d -> u)
-> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody -> [u]
gmapQr :: (r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
-> r
$cgmapQr :: forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
-> r
gmapQl :: (r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
-> r
$cgmapQl :: forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
-> r
gmapT :: (forall b. Data b => b -> b)
-> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
-> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
$cgmapT :: (forall b. Data b => b -> b)
-> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
-> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
dataCast2 :: (forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceLoginFlowWithLookupSecretMethodBody)
$cdataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceLoginFlowWithLookupSecretMethodBody)
dataCast1 :: (forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceLoginFlowWithLookupSecretMethodBody)
$cdataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceLoginFlowWithLookupSecretMethodBody)
dataTypeOf :: SubmitSelfServiceLoginFlowWithLookupSecretMethodBody -> DataType
$cdataTypeOf :: SubmitSelfServiceLoginFlowWithLookupSecretMethodBody -> DataType
toConstr :: SubmitSelfServiceLoginFlowWithLookupSecretMethodBody -> Constr
$ctoConstr :: SubmitSelfServiceLoginFlowWithLookupSecretMethodBody -> Constr
gunfold :: (forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
$cgunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
-> c SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
$cgfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
-> c SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
$cp1Data :: Typeable SubmitSelfServiceLoginFlowWithLookupSecretMethodBody
Data)

instance FromJSON SubmitSelfServiceLoginFlowWithLookupSecretMethodBody

instance ToJSON SubmitSelfServiceLoginFlowWithLookupSecretMethodBody where
  toEncoding :: SubmitSelfServiceLoginFlowWithLookupSecretMethodBody -> Encoding
toEncoding = Options
-> SubmitSelfServiceLoginFlowWithLookupSecretMethodBody -> Encoding
forall a.
(Generic a, GToJSON' Encoding Zero (Rep a)) =>
Options -> a -> Encoding
genericToEncoding Options
defaultOptions

-- | SubmitSelfServiceLoginFlowWithOidcMethodBody is used to decode the login form payload when using the oidc method.
data SubmitSelfServiceLoginFlowWithOidcMethodBody = SubmitSelfServiceLoginFlowWithOidcMethodBody
  { -- | The CSRF Token
    SubmitSelfServiceLoginFlowWithOidcMethodBody -> Maybe Text
csrf_token :: Maybe Text,
    -- | Method to use  This field must be set to `oidc` when using the oidc method.
    SubmitSelfServiceLoginFlowWithOidcMethodBody -> Text
method :: Text,
    -- | The provider to register with
    SubmitSelfServiceLoginFlowWithOidcMethodBody -> Text
provider :: Text,
    -- | The identity traits. This is a placeholder for the registration flow.
    SubmitSelfServiceLoginFlowWithOidcMethodBody -> Maybe Value
traits :: Maybe Value
  }
  deriving stock (Int -> SubmitSelfServiceLoginFlowWithOidcMethodBody -> ShowS
[SubmitSelfServiceLoginFlowWithOidcMethodBody] -> ShowS
SubmitSelfServiceLoginFlowWithOidcMethodBody -> String
(Int -> SubmitSelfServiceLoginFlowWithOidcMethodBody -> ShowS)
-> (SubmitSelfServiceLoginFlowWithOidcMethodBody -> String)
-> ([SubmitSelfServiceLoginFlowWithOidcMethodBody] -> ShowS)
-> Show SubmitSelfServiceLoginFlowWithOidcMethodBody
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [SubmitSelfServiceLoginFlowWithOidcMethodBody] -> ShowS
$cshowList :: [SubmitSelfServiceLoginFlowWithOidcMethodBody] -> ShowS
show :: SubmitSelfServiceLoginFlowWithOidcMethodBody -> String
$cshow :: SubmitSelfServiceLoginFlowWithOidcMethodBody -> String
showsPrec :: Int -> SubmitSelfServiceLoginFlowWithOidcMethodBody -> ShowS
$cshowsPrec :: Int -> SubmitSelfServiceLoginFlowWithOidcMethodBody -> ShowS
Show, SubmitSelfServiceLoginFlowWithOidcMethodBody
-> SubmitSelfServiceLoginFlowWithOidcMethodBody -> Bool
(SubmitSelfServiceLoginFlowWithOidcMethodBody
 -> SubmitSelfServiceLoginFlowWithOidcMethodBody -> Bool)
-> (SubmitSelfServiceLoginFlowWithOidcMethodBody
    -> SubmitSelfServiceLoginFlowWithOidcMethodBody -> Bool)
-> Eq SubmitSelfServiceLoginFlowWithOidcMethodBody
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: SubmitSelfServiceLoginFlowWithOidcMethodBody
-> SubmitSelfServiceLoginFlowWithOidcMethodBody -> Bool
$c/= :: SubmitSelfServiceLoginFlowWithOidcMethodBody
-> SubmitSelfServiceLoginFlowWithOidcMethodBody -> Bool
== :: SubmitSelfServiceLoginFlowWithOidcMethodBody
-> SubmitSelfServiceLoginFlowWithOidcMethodBody -> Bool
$c== :: SubmitSelfServiceLoginFlowWithOidcMethodBody
-> SubmitSelfServiceLoginFlowWithOidcMethodBody -> Bool
Eq, (forall x.
 SubmitSelfServiceLoginFlowWithOidcMethodBody
 -> Rep SubmitSelfServiceLoginFlowWithOidcMethodBody x)
-> (forall x.
    Rep SubmitSelfServiceLoginFlowWithOidcMethodBody x
    -> SubmitSelfServiceLoginFlowWithOidcMethodBody)
-> Generic SubmitSelfServiceLoginFlowWithOidcMethodBody
forall x.
Rep SubmitSelfServiceLoginFlowWithOidcMethodBody x
-> SubmitSelfServiceLoginFlowWithOidcMethodBody
forall x.
SubmitSelfServiceLoginFlowWithOidcMethodBody
-> Rep SubmitSelfServiceLoginFlowWithOidcMethodBody x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep SubmitSelfServiceLoginFlowWithOidcMethodBody x
-> SubmitSelfServiceLoginFlowWithOidcMethodBody
$cfrom :: forall x.
SubmitSelfServiceLoginFlowWithOidcMethodBody
-> Rep SubmitSelfServiceLoginFlowWithOidcMethodBody x
Generic, Typeable SubmitSelfServiceLoginFlowWithOidcMethodBody
DataType
Constr
Typeable SubmitSelfServiceLoginFlowWithOidcMethodBody
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g)
    -> SubmitSelfServiceLoginFlowWithOidcMethodBody
    -> c SubmitSelfServiceLoginFlowWithOidcMethodBody)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r)
    -> Constr
    -> c SubmitSelfServiceLoginFlowWithOidcMethodBody)
-> (SubmitSelfServiceLoginFlowWithOidcMethodBody -> Constr)
-> (SubmitSelfServiceLoginFlowWithOidcMethodBody -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d))
    -> Maybe (c SubmitSelfServiceLoginFlowWithOidcMethodBody))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e))
    -> Maybe (c SubmitSelfServiceLoginFlowWithOidcMethodBody))
-> ((forall b. Data b => b -> b)
    -> SubmitSelfServiceLoginFlowWithOidcMethodBody
    -> SubmitSelfServiceLoginFlowWithOidcMethodBody)
-> (forall r r'.
    (r -> r' -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SubmitSelfServiceLoginFlowWithOidcMethodBody
    -> r)
-> (forall r r'.
    (r' -> r -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SubmitSelfServiceLoginFlowWithOidcMethodBody
    -> r)
-> (forall u.
    (forall d. Data d => d -> u)
    -> SubmitSelfServiceLoginFlowWithOidcMethodBody -> [u])
-> (forall u.
    Int
    -> (forall d. Data d => d -> u)
    -> SubmitSelfServiceLoginFlowWithOidcMethodBody
    -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceLoginFlowWithOidcMethodBody
    -> m SubmitSelfServiceLoginFlowWithOidcMethodBody)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceLoginFlowWithOidcMethodBody
    -> m SubmitSelfServiceLoginFlowWithOidcMethodBody)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceLoginFlowWithOidcMethodBody
    -> m SubmitSelfServiceLoginFlowWithOidcMethodBody)
-> Data SubmitSelfServiceLoginFlowWithOidcMethodBody
SubmitSelfServiceLoginFlowWithOidcMethodBody -> DataType
SubmitSelfServiceLoginFlowWithOidcMethodBody -> Constr
(forall b. Data b => b -> b)
-> SubmitSelfServiceLoginFlowWithOidcMethodBody
-> SubmitSelfServiceLoginFlowWithOidcMethodBody
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceLoginFlowWithOidcMethodBody
-> c SubmitSelfServiceLoginFlowWithOidcMethodBody
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceLoginFlowWithOidcMethodBody
forall a.
Typeable a
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g) -> a -> c a)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r) -> Constr -> c a)
-> (a -> Constr)
-> (a -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d)) -> Maybe (c a))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c a))
-> ((forall b. Data b => b -> b) -> a -> a)
-> (forall r r'.
    (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall r r'.
    (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall u. (forall d. Data d => d -> u) -> a -> [u])
-> (forall u. Int -> (forall d. Data d => d -> u) -> a -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> Data a
forall u.
Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceLoginFlowWithOidcMethodBody
-> u
forall u.
(forall d. Data d => d -> u)
-> SubmitSelfServiceLoginFlowWithOidcMethodBody -> [u]
forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceLoginFlowWithOidcMethodBody
-> r
forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceLoginFlowWithOidcMethodBody
-> r
forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowWithOidcMethodBody
-> m SubmitSelfServiceLoginFlowWithOidcMethodBody
forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowWithOidcMethodBody
-> m SubmitSelfServiceLoginFlowWithOidcMethodBody
forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceLoginFlowWithOidcMethodBody
forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceLoginFlowWithOidcMethodBody
-> c SubmitSelfServiceLoginFlowWithOidcMethodBody
forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceLoginFlowWithOidcMethodBody)
forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceLoginFlowWithOidcMethodBody)
$cSubmitSelfServiceLoginFlowWithOidcMethodBody :: Constr
$tSubmitSelfServiceLoginFlowWithOidcMethodBody :: DataType
gmapMo :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowWithOidcMethodBody
-> m SubmitSelfServiceLoginFlowWithOidcMethodBody
$cgmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowWithOidcMethodBody
-> m SubmitSelfServiceLoginFlowWithOidcMethodBody
gmapMp :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowWithOidcMethodBody
-> m SubmitSelfServiceLoginFlowWithOidcMethodBody
$cgmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowWithOidcMethodBody
-> m SubmitSelfServiceLoginFlowWithOidcMethodBody
gmapM :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowWithOidcMethodBody
-> m SubmitSelfServiceLoginFlowWithOidcMethodBody
$cgmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowWithOidcMethodBody
-> m SubmitSelfServiceLoginFlowWithOidcMethodBody
gmapQi :: Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceLoginFlowWithOidcMethodBody
-> u
$cgmapQi :: forall u.
Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceLoginFlowWithOidcMethodBody
-> u
gmapQ :: (forall d. Data d => d -> u)
-> SubmitSelfServiceLoginFlowWithOidcMethodBody -> [u]
$cgmapQ :: forall u.
(forall d. Data d => d -> u)
-> SubmitSelfServiceLoginFlowWithOidcMethodBody -> [u]
gmapQr :: (r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceLoginFlowWithOidcMethodBody
-> r
$cgmapQr :: forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceLoginFlowWithOidcMethodBody
-> r
gmapQl :: (r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceLoginFlowWithOidcMethodBody
-> r
$cgmapQl :: forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceLoginFlowWithOidcMethodBody
-> r
gmapT :: (forall b. Data b => b -> b)
-> SubmitSelfServiceLoginFlowWithOidcMethodBody
-> SubmitSelfServiceLoginFlowWithOidcMethodBody
$cgmapT :: (forall b. Data b => b -> b)
-> SubmitSelfServiceLoginFlowWithOidcMethodBody
-> SubmitSelfServiceLoginFlowWithOidcMethodBody
dataCast2 :: (forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceLoginFlowWithOidcMethodBody)
$cdataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceLoginFlowWithOidcMethodBody)
dataCast1 :: (forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceLoginFlowWithOidcMethodBody)
$cdataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceLoginFlowWithOidcMethodBody)
dataTypeOf :: SubmitSelfServiceLoginFlowWithOidcMethodBody -> DataType
$cdataTypeOf :: SubmitSelfServiceLoginFlowWithOidcMethodBody -> DataType
toConstr :: SubmitSelfServiceLoginFlowWithOidcMethodBody -> Constr
$ctoConstr :: SubmitSelfServiceLoginFlowWithOidcMethodBody -> Constr
gunfold :: (forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceLoginFlowWithOidcMethodBody
$cgunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceLoginFlowWithOidcMethodBody
gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceLoginFlowWithOidcMethodBody
-> c SubmitSelfServiceLoginFlowWithOidcMethodBody
$cgfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceLoginFlowWithOidcMethodBody
-> c SubmitSelfServiceLoginFlowWithOidcMethodBody
$cp1Data :: Typeable SubmitSelfServiceLoginFlowWithOidcMethodBody
Data)

instance FromJSON SubmitSelfServiceLoginFlowWithOidcMethodBody

instance ToJSON SubmitSelfServiceLoginFlowWithOidcMethodBody where
  toEncoding :: SubmitSelfServiceLoginFlowWithOidcMethodBody -> Encoding
toEncoding = Options -> SubmitSelfServiceLoginFlowWithOidcMethodBody -> Encoding
forall a.
(Generic a, GToJSON' Encoding Zero (Rep a)) =>
Options -> a -> Encoding
genericToEncoding Options
defaultOptions

data SubmitSelfServiceLoginFlowWithPasswordMethodBody = SubmitSelfServiceLoginFlowWithPasswordMethodBody
  { -- | Sending the anti-csrf token is only required for browser login flows.
    SubmitSelfServiceLoginFlowWithPasswordMethodBody -> Maybe Text
csrf_token :: Maybe Text,
    -- | Identifier is the email or username of the user trying to log in.
    SubmitSelfServiceLoginFlowWithPasswordMethodBody -> Text
identifier :: Text,
    -- | Method should be set to \"password\" when logging in using the identifier and password strategy.
    SubmitSelfServiceLoginFlowWithPasswordMethodBody -> Text
method :: Text,
    -- | The user's password.
    SubmitSelfServiceLoginFlowWithPasswordMethodBody -> Text
password :: Text,
    -- | Identifier is the email or username of the user trying to log in. This field is deprecated!
    SubmitSelfServiceLoginFlowWithPasswordMethodBody -> Maybe Text
password_identifier :: Maybe Text
  }
  deriving stock (Int -> SubmitSelfServiceLoginFlowWithPasswordMethodBody -> ShowS
[SubmitSelfServiceLoginFlowWithPasswordMethodBody] -> ShowS
SubmitSelfServiceLoginFlowWithPasswordMethodBody -> String
(Int -> SubmitSelfServiceLoginFlowWithPasswordMethodBody -> ShowS)
-> (SubmitSelfServiceLoginFlowWithPasswordMethodBody -> String)
-> ([SubmitSelfServiceLoginFlowWithPasswordMethodBody] -> ShowS)
-> Show SubmitSelfServiceLoginFlowWithPasswordMethodBody
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [SubmitSelfServiceLoginFlowWithPasswordMethodBody] -> ShowS
$cshowList :: [SubmitSelfServiceLoginFlowWithPasswordMethodBody] -> ShowS
show :: SubmitSelfServiceLoginFlowWithPasswordMethodBody -> String
$cshow :: SubmitSelfServiceLoginFlowWithPasswordMethodBody -> String
showsPrec :: Int -> SubmitSelfServiceLoginFlowWithPasswordMethodBody -> ShowS
$cshowsPrec :: Int -> SubmitSelfServiceLoginFlowWithPasswordMethodBody -> ShowS
Show, SubmitSelfServiceLoginFlowWithPasswordMethodBody
-> SubmitSelfServiceLoginFlowWithPasswordMethodBody -> Bool
(SubmitSelfServiceLoginFlowWithPasswordMethodBody
 -> SubmitSelfServiceLoginFlowWithPasswordMethodBody -> Bool)
-> (SubmitSelfServiceLoginFlowWithPasswordMethodBody
    -> SubmitSelfServiceLoginFlowWithPasswordMethodBody -> Bool)
-> Eq SubmitSelfServiceLoginFlowWithPasswordMethodBody
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: SubmitSelfServiceLoginFlowWithPasswordMethodBody
-> SubmitSelfServiceLoginFlowWithPasswordMethodBody -> Bool
$c/= :: SubmitSelfServiceLoginFlowWithPasswordMethodBody
-> SubmitSelfServiceLoginFlowWithPasswordMethodBody -> Bool
== :: SubmitSelfServiceLoginFlowWithPasswordMethodBody
-> SubmitSelfServiceLoginFlowWithPasswordMethodBody -> Bool
$c== :: SubmitSelfServiceLoginFlowWithPasswordMethodBody
-> SubmitSelfServiceLoginFlowWithPasswordMethodBody -> Bool
Eq, (forall x.
 SubmitSelfServiceLoginFlowWithPasswordMethodBody
 -> Rep SubmitSelfServiceLoginFlowWithPasswordMethodBody x)
-> (forall x.
    Rep SubmitSelfServiceLoginFlowWithPasswordMethodBody x
    -> SubmitSelfServiceLoginFlowWithPasswordMethodBody)
-> Generic SubmitSelfServiceLoginFlowWithPasswordMethodBody
forall x.
Rep SubmitSelfServiceLoginFlowWithPasswordMethodBody x
-> SubmitSelfServiceLoginFlowWithPasswordMethodBody
forall x.
SubmitSelfServiceLoginFlowWithPasswordMethodBody
-> Rep SubmitSelfServiceLoginFlowWithPasswordMethodBody x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep SubmitSelfServiceLoginFlowWithPasswordMethodBody x
-> SubmitSelfServiceLoginFlowWithPasswordMethodBody
$cfrom :: forall x.
SubmitSelfServiceLoginFlowWithPasswordMethodBody
-> Rep SubmitSelfServiceLoginFlowWithPasswordMethodBody x
Generic, Typeable SubmitSelfServiceLoginFlowWithPasswordMethodBody
DataType
Constr
Typeable SubmitSelfServiceLoginFlowWithPasswordMethodBody
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g)
    -> SubmitSelfServiceLoginFlowWithPasswordMethodBody
    -> c SubmitSelfServiceLoginFlowWithPasswordMethodBody)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r)
    -> Constr
    -> c SubmitSelfServiceLoginFlowWithPasswordMethodBody)
-> (SubmitSelfServiceLoginFlowWithPasswordMethodBody -> Constr)
-> (SubmitSelfServiceLoginFlowWithPasswordMethodBody -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d))
    -> Maybe (c SubmitSelfServiceLoginFlowWithPasswordMethodBody))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e))
    -> Maybe (c SubmitSelfServiceLoginFlowWithPasswordMethodBody))
-> ((forall b. Data b => b -> b)
    -> SubmitSelfServiceLoginFlowWithPasswordMethodBody
    -> SubmitSelfServiceLoginFlowWithPasswordMethodBody)
-> (forall r r'.
    (r -> r' -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SubmitSelfServiceLoginFlowWithPasswordMethodBody
    -> r)
-> (forall r r'.
    (r' -> r -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SubmitSelfServiceLoginFlowWithPasswordMethodBody
    -> r)
-> (forall u.
    (forall d. Data d => d -> u)
    -> SubmitSelfServiceLoginFlowWithPasswordMethodBody -> [u])
-> (forall u.
    Int
    -> (forall d. Data d => d -> u)
    -> SubmitSelfServiceLoginFlowWithPasswordMethodBody
    -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceLoginFlowWithPasswordMethodBody
    -> m SubmitSelfServiceLoginFlowWithPasswordMethodBody)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceLoginFlowWithPasswordMethodBody
    -> m SubmitSelfServiceLoginFlowWithPasswordMethodBody)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceLoginFlowWithPasswordMethodBody
    -> m SubmitSelfServiceLoginFlowWithPasswordMethodBody)
-> Data SubmitSelfServiceLoginFlowWithPasswordMethodBody
SubmitSelfServiceLoginFlowWithPasswordMethodBody -> DataType
SubmitSelfServiceLoginFlowWithPasswordMethodBody -> Constr
(forall b. Data b => b -> b)
-> SubmitSelfServiceLoginFlowWithPasswordMethodBody
-> SubmitSelfServiceLoginFlowWithPasswordMethodBody
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceLoginFlowWithPasswordMethodBody
-> c SubmitSelfServiceLoginFlowWithPasswordMethodBody
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceLoginFlowWithPasswordMethodBody
forall a.
Typeable a
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g) -> a -> c a)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r) -> Constr -> c a)
-> (a -> Constr)
-> (a -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d)) -> Maybe (c a))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c a))
-> ((forall b. Data b => b -> b) -> a -> a)
-> (forall r r'.
    (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall r r'.
    (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall u. (forall d. Data d => d -> u) -> a -> [u])
-> (forall u. Int -> (forall d. Data d => d -> u) -> a -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> Data a
forall u.
Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceLoginFlowWithPasswordMethodBody
-> u
forall u.
(forall d. Data d => d -> u)
-> SubmitSelfServiceLoginFlowWithPasswordMethodBody -> [u]
forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceLoginFlowWithPasswordMethodBody
-> r
forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceLoginFlowWithPasswordMethodBody
-> r
forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowWithPasswordMethodBody
-> m SubmitSelfServiceLoginFlowWithPasswordMethodBody
forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowWithPasswordMethodBody
-> m SubmitSelfServiceLoginFlowWithPasswordMethodBody
forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceLoginFlowWithPasswordMethodBody
forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceLoginFlowWithPasswordMethodBody
-> c SubmitSelfServiceLoginFlowWithPasswordMethodBody
forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceLoginFlowWithPasswordMethodBody)
forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceLoginFlowWithPasswordMethodBody)
$cSubmitSelfServiceLoginFlowWithPasswordMethodBody :: Constr
$tSubmitSelfServiceLoginFlowWithPasswordMethodBody :: DataType
gmapMo :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowWithPasswordMethodBody
-> m SubmitSelfServiceLoginFlowWithPasswordMethodBody
$cgmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowWithPasswordMethodBody
-> m SubmitSelfServiceLoginFlowWithPasswordMethodBody
gmapMp :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowWithPasswordMethodBody
-> m SubmitSelfServiceLoginFlowWithPasswordMethodBody
$cgmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowWithPasswordMethodBody
-> m SubmitSelfServiceLoginFlowWithPasswordMethodBody
gmapM :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowWithPasswordMethodBody
-> m SubmitSelfServiceLoginFlowWithPasswordMethodBody
$cgmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowWithPasswordMethodBody
-> m SubmitSelfServiceLoginFlowWithPasswordMethodBody
gmapQi :: Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceLoginFlowWithPasswordMethodBody
-> u
$cgmapQi :: forall u.
Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceLoginFlowWithPasswordMethodBody
-> u
gmapQ :: (forall d. Data d => d -> u)
-> SubmitSelfServiceLoginFlowWithPasswordMethodBody -> [u]
$cgmapQ :: forall u.
(forall d. Data d => d -> u)
-> SubmitSelfServiceLoginFlowWithPasswordMethodBody -> [u]
gmapQr :: (r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceLoginFlowWithPasswordMethodBody
-> r
$cgmapQr :: forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceLoginFlowWithPasswordMethodBody
-> r
gmapQl :: (r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceLoginFlowWithPasswordMethodBody
-> r
$cgmapQl :: forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceLoginFlowWithPasswordMethodBody
-> r
gmapT :: (forall b. Data b => b -> b)
-> SubmitSelfServiceLoginFlowWithPasswordMethodBody
-> SubmitSelfServiceLoginFlowWithPasswordMethodBody
$cgmapT :: (forall b. Data b => b -> b)
-> SubmitSelfServiceLoginFlowWithPasswordMethodBody
-> SubmitSelfServiceLoginFlowWithPasswordMethodBody
dataCast2 :: (forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceLoginFlowWithPasswordMethodBody)
$cdataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceLoginFlowWithPasswordMethodBody)
dataCast1 :: (forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceLoginFlowWithPasswordMethodBody)
$cdataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceLoginFlowWithPasswordMethodBody)
dataTypeOf :: SubmitSelfServiceLoginFlowWithPasswordMethodBody -> DataType
$cdataTypeOf :: SubmitSelfServiceLoginFlowWithPasswordMethodBody -> DataType
toConstr :: SubmitSelfServiceLoginFlowWithPasswordMethodBody -> Constr
$ctoConstr :: SubmitSelfServiceLoginFlowWithPasswordMethodBody -> Constr
gunfold :: (forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceLoginFlowWithPasswordMethodBody
$cgunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceLoginFlowWithPasswordMethodBody
gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceLoginFlowWithPasswordMethodBody
-> c SubmitSelfServiceLoginFlowWithPasswordMethodBody
$cgfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceLoginFlowWithPasswordMethodBody
-> c SubmitSelfServiceLoginFlowWithPasswordMethodBody
$cp1Data :: Typeable SubmitSelfServiceLoginFlowWithPasswordMethodBody
Data)

instance FromJSON SubmitSelfServiceLoginFlowWithPasswordMethodBody

instance ToJSON SubmitSelfServiceLoginFlowWithPasswordMethodBody where
  toEncoding :: SubmitSelfServiceLoginFlowWithPasswordMethodBody -> Encoding
toEncoding = Options
-> SubmitSelfServiceLoginFlowWithPasswordMethodBody -> Encoding
forall a.
(Generic a, GToJSON' Encoding Zero (Rep a)) =>
Options -> a -> Encoding
genericToEncoding Options
defaultOptions

data SubmitSelfServiceLoginFlowWithTotpMethodBody = SubmitSelfServiceLoginFlowWithTotpMethodBody
  { -- | Sending the anti-csrf token is only required for browser login flows.
    SubmitSelfServiceLoginFlowWithTotpMethodBody -> Maybe Text
csrf_token :: Maybe Text,
    -- | Method should be set to \"totp\" when logging in using the TOTP strategy.
    SubmitSelfServiceLoginFlowWithTotpMethodBody -> Text
method :: Text,
    -- | The TOTP code.
    SubmitSelfServiceLoginFlowWithTotpMethodBody -> Text
totp_code :: Text
  }
  deriving stock (Int -> SubmitSelfServiceLoginFlowWithTotpMethodBody -> ShowS
[SubmitSelfServiceLoginFlowWithTotpMethodBody] -> ShowS
SubmitSelfServiceLoginFlowWithTotpMethodBody -> String
(Int -> SubmitSelfServiceLoginFlowWithTotpMethodBody -> ShowS)
-> (SubmitSelfServiceLoginFlowWithTotpMethodBody -> String)
-> ([SubmitSelfServiceLoginFlowWithTotpMethodBody] -> ShowS)
-> Show SubmitSelfServiceLoginFlowWithTotpMethodBody
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [SubmitSelfServiceLoginFlowWithTotpMethodBody] -> ShowS
$cshowList :: [SubmitSelfServiceLoginFlowWithTotpMethodBody] -> ShowS
show :: SubmitSelfServiceLoginFlowWithTotpMethodBody -> String
$cshow :: SubmitSelfServiceLoginFlowWithTotpMethodBody -> String
showsPrec :: Int -> SubmitSelfServiceLoginFlowWithTotpMethodBody -> ShowS
$cshowsPrec :: Int -> SubmitSelfServiceLoginFlowWithTotpMethodBody -> ShowS
Show, SubmitSelfServiceLoginFlowWithTotpMethodBody
-> SubmitSelfServiceLoginFlowWithTotpMethodBody -> Bool
(SubmitSelfServiceLoginFlowWithTotpMethodBody
 -> SubmitSelfServiceLoginFlowWithTotpMethodBody -> Bool)
-> (SubmitSelfServiceLoginFlowWithTotpMethodBody
    -> SubmitSelfServiceLoginFlowWithTotpMethodBody -> Bool)
-> Eq SubmitSelfServiceLoginFlowWithTotpMethodBody
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: SubmitSelfServiceLoginFlowWithTotpMethodBody
-> SubmitSelfServiceLoginFlowWithTotpMethodBody -> Bool
$c/= :: SubmitSelfServiceLoginFlowWithTotpMethodBody
-> SubmitSelfServiceLoginFlowWithTotpMethodBody -> Bool
== :: SubmitSelfServiceLoginFlowWithTotpMethodBody
-> SubmitSelfServiceLoginFlowWithTotpMethodBody -> Bool
$c== :: SubmitSelfServiceLoginFlowWithTotpMethodBody
-> SubmitSelfServiceLoginFlowWithTotpMethodBody -> Bool
Eq, (forall x.
 SubmitSelfServiceLoginFlowWithTotpMethodBody
 -> Rep SubmitSelfServiceLoginFlowWithTotpMethodBody x)
-> (forall x.
    Rep SubmitSelfServiceLoginFlowWithTotpMethodBody x
    -> SubmitSelfServiceLoginFlowWithTotpMethodBody)
-> Generic SubmitSelfServiceLoginFlowWithTotpMethodBody
forall x.
Rep SubmitSelfServiceLoginFlowWithTotpMethodBody x
-> SubmitSelfServiceLoginFlowWithTotpMethodBody
forall x.
SubmitSelfServiceLoginFlowWithTotpMethodBody
-> Rep SubmitSelfServiceLoginFlowWithTotpMethodBody x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep SubmitSelfServiceLoginFlowWithTotpMethodBody x
-> SubmitSelfServiceLoginFlowWithTotpMethodBody
$cfrom :: forall x.
SubmitSelfServiceLoginFlowWithTotpMethodBody
-> Rep SubmitSelfServiceLoginFlowWithTotpMethodBody x
Generic, Typeable SubmitSelfServiceLoginFlowWithTotpMethodBody
DataType
Constr
Typeable SubmitSelfServiceLoginFlowWithTotpMethodBody
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g)
    -> SubmitSelfServiceLoginFlowWithTotpMethodBody
    -> c SubmitSelfServiceLoginFlowWithTotpMethodBody)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r)
    -> Constr
    -> c SubmitSelfServiceLoginFlowWithTotpMethodBody)
-> (SubmitSelfServiceLoginFlowWithTotpMethodBody -> Constr)
-> (SubmitSelfServiceLoginFlowWithTotpMethodBody -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d))
    -> Maybe (c SubmitSelfServiceLoginFlowWithTotpMethodBody))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e))
    -> Maybe (c SubmitSelfServiceLoginFlowWithTotpMethodBody))
-> ((forall b. Data b => b -> b)
    -> SubmitSelfServiceLoginFlowWithTotpMethodBody
    -> SubmitSelfServiceLoginFlowWithTotpMethodBody)
-> (forall r r'.
    (r -> r' -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SubmitSelfServiceLoginFlowWithTotpMethodBody
    -> r)
-> (forall r r'.
    (r' -> r -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SubmitSelfServiceLoginFlowWithTotpMethodBody
    -> r)
-> (forall u.
    (forall d. Data d => d -> u)
    -> SubmitSelfServiceLoginFlowWithTotpMethodBody -> [u])
-> (forall u.
    Int
    -> (forall d. Data d => d -> u)
    -> SubmitSelfServiceLoginFlowWithTotpMethodBody
    -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceLoginFlowWithTotpMethodBody
    -> m SubmitSelfServiceLoginFlowWithTotpMethodBody)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceLoginFlowWithTotpMethodBody
    -> m SubmitSelfServiceLoginFlowWithTotpMethodBody)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceLoginFlowWithTotpMethodBody
    -> m SubmitSelfServiceLoginFlowWithTotpMethodBody)
-> Data SubmitSelfServiceLoginFlowWithTotpMethodBody
SubmitSelfServiceLoginFlowWithTotpMethodBody -> DataType
SubmitSelfServiceLoginFlowWithTotpMethodBody -> Constr
(forall b. Data b => b -> b)
-> SubmitSelfServiceLoginFlowWithTotpMethodBody
-> SubmitSelfServiceLoginFlowWithTotpMethodBody
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceLoginFlowWithTotpMethodBody
-> c SubmitSelfServiceLoginFlowWithTotpMethodBody
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceLoginFlowWithTotpMethodBody
forall a.
Typeable a
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g) -> a -> c a)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r) -> Constr -> c a)
-> (a -> Constr)
-> (a -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d)) -> Maybe (c a))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c a))
-> ((forall b. Data b => b -> b) -> a -> a)
-> (forall r r'.
    (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall r r'.
    (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall u. (forall d. Data d => d -> u) -> a -> [u])
-> (forall u. Int -> (forall d. Data d => d -> u) -> a -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> Data a
forall u.
Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceLoginFlowWithTotpMethodBody
-> u
forall u.
(forall d. Data d => d -> u)
-> SubmitSelfServiceLoginFlowWithTotpMethodBody -> [u]
forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceLoginFlowWithTotpMethodBody
-> r
forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceLoginFlowWithTotpMethodBody
-> r
forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowWithTotpMethodBody
-> m SubmitSelfServiceLoginFlowWithTotpMethodBody
forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowWithTotpMethodBody
-> m SubmitSelfServiceLoginFlowWithTotpMethodBody
forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceLoginFlowWithTotpMethodBody
forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceLoginFlowWithTotpMethodBody
-> c SubmitSelfServiceLoginFlowWithTotpMethodBody
forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceLoginFlowWithTotpMethodBody)
forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceLoginFlowWithTotpMethodBody)
$cSubmitSelfServiceLoginFlowWithTotpMethodBody :: Constr
$tSubmitSelfServiceLoginFlowWithTotpMethodBody :: DataType
gmapMo :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowWithTotpMethodBody
-> m SubmitSelfServiceLoginFlowWithTotpMethodBody
$cgmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowWithTotpMethodBody
-> m SubmitSelfServiceLoginFlowWithTotpMethodBody
gmapMp :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowWithTotpMethodBody
-> m SubmitSelfServiceLoginFlowWithTotpMethodBody
$cgmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowWithTotpMethodBody
-> m SubmitSelfServiceLoginFlowWithTotpMethodBody
gmapM :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowWithTotpMethodBody
-> m SubmitSelfServiceLoginFlowWithTotpMethodBody
$cgmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowWithTotpMethodBody
-> m SubmitSelfServiceLoginFlowWithTotpMethodBody
gmapQi :: Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceLoginFlowWithTotpMethodBody
-> u
$cgmapQi :: forall u.
Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceLoginFlowWithTotpMethodBody
-> u
gmapQ :: (forall d. Data d => d -> u)
-> SubmitSelfServiceLoginFlowWithTotpMethodBody -> [u]
$cgmapQ :: forall u.
(forall d. Data d => d -> u)
-> SubmitSelfServiceLoginFlowWithTotpMethodBody -> [u]
gmapQr :: (r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceLoginFlowWithTotpMethodBody
-> r
$cgmapQr :: forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceLoginFlowWithTotpMethodBody
-> r
gmapQl :: (r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceLoginFlowWithTotpMethodBody
-> r
$cgmapQl :: forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceLoginFlowWithTotpMethodBody
-> r
gmapT :: (forall b. Data b => b -> b)
-> SubmitSelfServiceLoginFlowWithTotpMethodBody
-> SubmitSelfServiceLoginFlowWithTotpMethodBody
$cgmapT :: (forall b. Data b => b -> b)
-> SubmitSelfServiceLoginFlowWithTotpMethodBody
-> SubmitSelfServiceLoginFlowWithTotpMethodBody
dataCast2 :: (forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceLoginFlowWithTotpMethodBody)
$cdataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceLoginFlowWithTotpMethodBody)
dataCast1 :: (forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceLoginFlowWithTotpMethodBody)
$cdataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceLoginFlowWithTotpMethodBody)
dataTypeOf :: SubmitSelfServiceLoginFlowWithTotpMethodBody -> DataType
$cdataTypeOf :: SubmitSelfServiceLoginFlowWithTotpMethodBody -> DataType
toConstr :: SubmitSelfServiceLoginFlowWithTotpMethodBody -> Constr
$ctoConstr :: SubmitSelfServiceLoginFlowWithTotpMethodBody -> Constr
gunfold :: (forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceLoginFlowWithTotpMethodBody
$cgunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceLoginFlowWithTotpMethodBody
gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceLoginFlowWithTotpMethodBody
-> c SubmitSelfServiceLoginFlowWithTotpMethodBody
$cgfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceLoginFlowWithTotpMethodBody
-> c SubmitSelfServiceLoginFlowWithTotpMethodBody
$cp1Data :: Typeable SubmitSelfServiceLoginFlowWithTotpMethodBody
Data)

instance FromJSON SubmitSelfServiceLoginFlowWithTotpMethodBody

instance ToJSON SubmitSelfServiceLoginFlowWithTotpMethodBody where
  toEncoding :: SubmitSelfServiceLoginFlowWithTotpMethodBody -> Encoding
toEncoding = Options -> SubmitSelfServiceLoginFlowWithTotpMethodBody -> Encoding
forall a.
(Generic a, GToJSON' Encoding Zero (Rep a)) =>
Options -> a -> Encoding
genericToEncoding Options
defaultOptions

data SubmitSelfServiceLoginFlowWithWebAuthnMethodBody = SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
  { -- | Sending the anti-csrf token is only required for browser login flows.
    SubmitSelfServiceLoginFlowWithWebAuthnMethodBody -> Maybe Text
csrf_token :: Maybe Text,
    -- | Identifier is the email or username of the user trying to log in. This field is only required when using WebAuthn for passwordless login. When using WebAuthn for multi-factor authentication, it is not needed.
    SubmitSelfServiceLoginFlowWithWebAuthnMethodBody -> Maybe Text
identifier :: Maybe Text,
    -- | Method should be set to \"webAuthn\" when logging in using the WebAuthn strategy.
    SubmitSelfServiceLoginFlowWithWebAuthnMethodBody -> Text
method :: Text,
    -- | Login a WebAuthn Security Key  This must contain the ID of the WebAuthN connection.
    SubmitSelfServiceLoginFlowWithWebAuthnMethodBody -> Maybe Text
webauthn_login :: Maybe Text
  }
  deriving stock (Int -> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody -> ShowS
[SubmitSelfServiceLoginFlowWithWebAuthnMethodBody] -> ShowS
SubmitSelfServiceLoginFlowWithWebAuthnMethodBody -> String
(Int -> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody -> ShowS)
-> (SubmitSelfServiceLoginFlowWithWebAuthnMethodBody -> String)
-> ([SubmitSelfServiceLoginFlowWithWebAuthnMethodBody] -> ShowS)
-> Show SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [SubmitSelfServiceLoginFlowWithWebAuthnMethodBody] -> ShowS
$cshowList :: [SubmitSelfServiceLoginFlowWithWebAuthnMethodBody] -> ShowS
show :: SubmitSelfServiceLoginFlowWithWebAuthnMethodBody -> String
$cshow :: SubmitSelfServiceLoginFlowWithWebAuthnMethodBody -> String
showsPrec :: Int -> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody -> ShowS
$cshowsPrec :: Int -> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody -> ShowS
Show, SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
-> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody -> Bool
(SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
 -> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody -> Bool)
-> (SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
    -> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody -> Bool)
-> Eq SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
-> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody -> Bool
$c/= :: SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
-> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody -> Bool
== :: SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
-> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody -> Bool
$c== :: SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
-> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody -> Bool
Eq, (forall x.
 SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
 -> Rep SubmitSelfServiceLoginFlowWithWebAuthnMethodBody x)
-> (forall x.
    Rep SubmitSelfServiceLoginFlowWithWebAuthnMethodBody x
    -> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody)
-> Generic SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
forall x.
Rep SubmitSelfServiceLoginFlowWithWebAuthnMethodBody x
-> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
forall x.
SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
-> Rep SubmitSelfServiceLoginFlowWithWebAuthnMethodBody x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep SubmitSelfServiceLoginFlowWithWebAuthnMethodBody x
-> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
$cfrom :: forall x.
SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
-> Rep SubmitSelfServiceLoginFlowWithWebAuthnMethodBody x
Generic, Typeable SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
DataType
Constr
Typeable SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g)
    -> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
    -> c SubmitSelfServiceLoginFlowWithWebAuthnMethodBody)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r)
    -> Constr
    -> c SubmitSelfServiceLoginFlowWithWebAuthnMethodBody)
-> (SubmitSelfServiceLoginFlowWithWebAuthnMethodBody -> Constr)
-> (SubmitSelfServiceLoginFlowWithWebAuthnMethodBody -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d))
    -> Maybe (c SubmitSelfServiceLoginFlowWithWebAuthnMethodBody))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e))
    -> Maybe (c SubmitSelfServiceLoginFlowWithWebAuthnMethodBody))
-> ((forall b. Data b => b -> b)
    -> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
    -> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody)
-> (forall r r'.
    (r -> r' -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
    -> r)
-> (forall r r'.
    (r' -> r -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
    -> r)
-> (forall u.
    (forall d. Data d => d -> u)
    -> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody -> [u])
-> (forall u.
    Int
    -> (forall d. Data d => d -> u)
    -> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
    -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
    -> m SubmitSelfServiceLoginFlowWithWebAuthnMethodBody)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
    -> m SubmitSelfServiceLoginFlowWithWebAuthnMethodBody)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
    -> m SubmitSelfServiceLoginFlowWithWebAuthnMethodBody)
-> Data SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
SubmitSelfServiceLoginFlowWithWebAuthnMethodBody -> DataType
SubmitSelfServiceLoginFlowWithWebAuthnMethodBody -> Constr
(forall b. Data b => b -> b)
-> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
-> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
-> c SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
forall a.
Typeable a
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g) -> a -> c a)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r) -> Constr -> c a)
-> (a -> Constr)
-> (a -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d)) -> Maybe (c a))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c a))
-> ((forall b. Data b => b -> b) -> a -> a)
-> (forall r r'.
    (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall r r'.
    (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall u. (forall d. Data d => d -> u) -> a -> [u])
-> (forall u. Int -> (forall d. Data d => d -> u) -> a -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> Data a
forall u.
Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
-> u
forall u.
(forall d. Data d => d -> u)
-> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody -> [u]
forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
-> r
forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
-> r
forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
-> m SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
-> m SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
-> c SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceLoginFlowWithWebAuthnMethodBody)
forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceLoginFlowWithWebAuthnMethodBody)
$cSubmitSelfServiceLoginFlowWithWebAuthnMethodBody :: Constr
$tSubmitSelfServiceLoginFlowWithWebAuthnMethodBody :: DataType
gmapMo :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
-> m SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
$cgmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
-> m SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
gmapMp :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
-> m SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
$cgmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
-> m SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
gmapM :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
-> m SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
$cgmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
-> m SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
gmapQi :: Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
-> u
$cgmapQi :: forall u.
Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
-> u
gmapQ :: (forall d. Data d => d -> u)
-> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody -> [u]
$cgmapQ :: forall u.
(forall d. Data d => d -> u)
-> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody -> [u]
gmapQr :: (r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
-> r
$cgmapQr :: forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
-> r
gmapQl :: (r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
-> r
$cgmapQl :: forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
-> r
gmapT :: (forall b. Data b => b -> b)
-> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
-> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
$cgmapT :: (forall b. Data b => b -> b)
-> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
-> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
dataCast2 :: (forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceLoginFlowWithWebAuthnMethodBody)
$cdataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceLoginFlowWithWebAuthnMethodBody)
dataCast1 :: (forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceLoginFlowWithWebAuthnMethodBody)
$cdataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceLoginFlowWithWebAuthnMethodBody)
dataTypeOf :: SubmitSelfServiceLoginFlowWithWebAuthnMethodBody -> DataType
$cdataTypeOf :: SubmitSelfServiceLoginFlowWithWebAuthnMethodBody -> DataType
toConstr :: SubmitSelfServiceLoginFlowWithWebAuthnMethodBody -> Constr
$ctoConstr :: SubmitSelfServiceLoginFlowWithWebAuthnMethodBody -> Constr
gunfold :: (forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
$cgunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
-> c SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
$cgfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
-> c SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
$cp1Data :: Typeable SubmitSelfServiceLoginFlowWithWebAuthnMethodBody
Data)

instance FromJSON SubmitSelfServiceLoginFlowWithWebAuthnMethodBody

instance ToJSON SubmitSelfServiceLoginFlowWithWebAuthnMethodBody where
  toEncoding :: SubmitSelfServiceLoginFlowWithWebAuthnMethodBody -> Encoding
toEncoding = Options
-> SubmitSelfServiceLoginFlowWithWebAuthnMethodBody -> Encoding
forall a.
(Generic a, GToJSON' Encoding Zero (Rep a)) =>
Options -> a -> Encoding
genericToEncoding Options
defaultOptions

-- | nolint:deadcode,unused
data SubmitSelfServiceLogoutFlowWithoutBrowserBody = SubmitSelfServiceLogoutFlowWithoutBrowserBody
  { -- | The Session Token  Invalidate this session token.
    SubmitSelfServiceLogoutFlowWithoutBrowserBody -> Text
session_token :: Text
  }
  deriving stock (Int -> SubmitSelfServiceLogoutFlowWithoutBrowserBody -> ShowS
[SubmitSelfServiceLogoutFlowWithoutBrowserBody] -> ShowS
SubmitSelfServiceLogoutFlowWithoutBrowserBody -> String
(Int -> SubmitSelfServiceLogoutFlowWithoutBrowserBody -> ShowS)
-> (SubmitSelfServiceLogoutFlowWithoutBrowserBody -> String)
-> ([SubmitSelfServiceLogoutFlowWithoutBrowserBody] -> ShowS)
-> Show SubmitSelfServiceLogoutFlowWithoutBrowserBody
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [SubmitSelfServiceLogoutFlowWithoutBrowserBody] -> ShowS
$cshowList :: [SubmitSelfServiceLogoutFlowWithoutBrowserBody] -> ShowS
show :: SubmitSelfServiceLogoutFlowWithoutBrowserBody -> String
$cshow :: SubmitSelfServiceLogoutFlowWithoutBrowserBody -> String
showsPrec :: Int -> SubmitSelfServiceLogoutFlowWithoutBrowserBody -> ShowS
$cshowsPrec :: Int -> SubmitSelfServiceLogoutFlowWithoutBrowserBody -> ShowS
Show, SubmitSelfServiceLogoutFlowWithoutBrowserBody
-> SubmitSelfServiceLogoutFlowWithoutBrowserBody -> Bool
(SubmitSelfServiceLogoutFlowWithoutBrowserBody
 -> SubmitSelfServiceLogoutFlowWithoutBrowserBody -> Bool)
-> (SubmitSelfServiceLogoutFlowWithoutBrowserBody
    -> SubmitSelfServiceLogoutFlowWithoutBrowserBody -> Bool)
-> Eq SubmitSelfServiceLogoutFlowWithoutBrowserBody
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: SubmitSelfServiceLogoutFlowWithoutBrowserBody
-> SubmitSelfServiceLogoutFlowWithoutBrowserBody -> Bool
$c/= :: SubmitSelfServiceLogoutFlowWithoutBrowserBody
-> SubmitSelfServiceLogoutFlowWithoutBrowserBody -> Bool
== :: SubmitSelfServiceLogoutFlowWithoutBrowserBody
-> SubmitSelfServiceLogoutFlowWithoutBrowserBody -> Bool
$c== :: SubmitSelfServiceLogoutFlowWithoutBrowserBody
-> SubmitSelfServiceLogoutFlowWithoutBrowserBody -> Bool
Eq, (forall x.
 SubmitSelfServiceLogoutFlowWithoutBrowserBody
 -> Rep SubmitSelfServiceLogoutFlowWithoutBrowserBody x)
-> (forall x.
    Rep SubmitSelfServiceLogoutFlowWithoutBrowserBody x
    -> SubmitSelfServiceLogoutFlowWithoutBrowserBody)
-> Generic SubmitSelfServiceLogoutFlowWithoutBrowserBody
forall x.
Rep SubmitSelfServiceLogoutFlowWithoutBrowserBody x
-> SubmitSelfServiceLogoutFlowWithoutBrowserBody
forall x.
SubmitSelfServiceLogoutFlowWithoutBrowserBody
-> Rep SubmitSelfServiceLogoutFlowWithoutBrowserBody x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep SubmitSelfServiceLogoutFlowWithoutBrowserBody x
-> SubmitSelfServiceLogoutFlowWithoutBrowserBody
$cfrom :: forall x.
SubmitSelfServiceLogoutFlowWithoutBrowserBody
-> Rep SubmitSelfServiceLogoutFlowWithoutBrowserBody x
Generic, Typeable SubmitSelfServiceLogoutFlowWithoutBrowserBody
DataType
Constr
Typeable SubmitSelfServiceLogoutFlowWithoutBrowserBody
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g)
    -> SubmitSelfServiceLogoutFlowWithoutBrowserBody
    -> c SubmitSelfServiceLogoutFlowWithoutBrowserBody)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r)
    -> Constr
    -> c SubmitSelfServiceLogoutFlowWithoutBrowserBody)
-> (SubmitSelfServiceLogoutFlowWithoutBrowserBody -> Constr)
-> (SubmitSelfServiceLogoutFlowWithoutBrowserBody -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d))
    -> Maybe (c SubmitSelfServiceLogoutFlowWithoutBrowserBody))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e))
    -> Maybe (c SubmitSelfServiceLogoutFlowWithoutBrowserBody))
-> ((forall b. Data b => b -> b)
    -> SubmitSelfServiceLogoutFlowWithoutBrowserBody
    -> SubmitSelfServiceLogoutFlowWithoutBrowserBody)
-> (forall r r'.
    (r -> r' -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SubmitSelfServiceLogoutFlowWithoutBrowserBody
    -> r)
-> (forall r r'.
    (r' -> r -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SubmitSelfServiceLogoutFlowWithoutBrowserBody
    -> r)
-> (forall u.
    (forall d. Data d => d -> u)
    -> SubmitSelfServiceLogoutFlowWithoutBrowserBody -> [u])
-> (forall u.
    Int
    -> (forall d. Data d => d -> u)
    -> SubmitSelfServiceLogoutFlowWithoutBrowserBody
    -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceLogoutFlowWithoutBrowserBody
    -> m SubmitSelfServiceLogoutFlowWithoutBrowserBody)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceLogoutFlowWithoutBrowserBody
    -> m SubmitSelfServiceLogoutFlowWithoutBrowserBody)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceLogoutFlowWithoutBrowserBody
    -> m SubmitSelfServiceLogoutFlowWithoutBrowserBody)
-> Data SubmitSelfServiceLogoutFlowWithoutBrowserBody
SubmitSelfServiceLogoutFlowWithoutBrowserBody -> DataType
SubmitSelfServiceLogoutFlowWithoutBrowserBody -> Constr
(forall b. Data b => b -> b)
-> SubmitSelfServiceLogoutFlowWithoutBrowserBody
-> SubmitSelfServiceLogoutFlowWithoutBrowserBody
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceLogoutFlowWithoutBrowserBody
-> c SubmitSelfServiceLogoutFlowWithoutBrowserBody
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceLogoutFlowWithoutBrowserBody
forall a.
Typeable a
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g) -> a -> c a)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r) -> Constr -> c a)
-> (a -> Constr)
-> (a -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d)) -> Maybe (c a))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c a))
-> ((forall b. Data b => b -> b) -> a -> a)
-> (forall r r'.
    (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall r r'.
    (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall u. (forall d. Data d => d -> u) -> a -> [u])
-> (forall u. Int -> (forall d. Data d => d -> u) -> a -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> Data a
forall u.
Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceLogoutFlowWithoutBrowserBody
-> u
forall u.
(forall d. Data d => d -> u)
-> SubmitSelfServiceLogoutFlowWithoutBrowserBody -> [u]
forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceLogoutFlowWithoutBrowserBody
-> r
forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceLogoutFlowWithoutBrowserBody
-> r
forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceLogoutFlowWithoutBrowserBody
-> m SubmitSelfServiceLogoutFlowWithoutBrowserBody
forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceLogoutFlowWithoutBrowserBody
-> m SubmitSelfServiceLogoutFlowWithoutBrowserBody
forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceLogoutFlowWithoutBrowserBody
forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceLogoutFlowWithoutBrowserBody
-> c SubmitSelfServiceLogoutFlowWithoutBrowserBody
forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceLogoutFlowWithoutBrowserBody)
forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceLogoutFlowWithoutBrowserBody)
$cSubmitSelfServiceLogoutFlowWithoutBrowserBody :: Constr
$tSubmitSelfServiceLogoutFlowWithoutBrowserBody :: DataType
gmapMo :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceLogoutFlowWithoutBrowserBody
-> m SubmitSelfServiceLogoutFlowWithoutBrowserBody
$cgmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceLogoutFlowWithoutBrowserBody
-> m SubmitSelfServiceLogoutFlowWithoutBrowserBody
gmapMp :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceLogoutFlowWithoutBrowserBody
-> m SubmitSelfServiceLogoutFlowWithoutBrowserBody
$cgmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceLogoutFlowWithoutBrowserBody
-> m SubmitSelfServiceLogoutFlowWithoutBrowserBody
gmapM :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceLogoutFlowWithoutBrowserBody
-> m SubmitSelfServiceLogoutFlowWithoutBrowserBody
$cgmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceLogoutFlowWithoutBrowserBody
-> m SubmitSelfServiceLogoutFlowWithoutBrowserBody
gmapQi :: Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceLogoutFlowWithoutBrowserBody
-> u
$cgmapQi :: forall u.
Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceLogoutFlowWithoutBrowserBody
-> u
gmapQ :: (forall d. Data d => d -> u)
-> SubmitSelfServiceLogoutFlowWithoutBrowserBody -> [u]
$cgmapQ :: forall u.
(forall d. Data d => d -> u)
-> SubmitSelfServiceLogoutFlowWithoutBrowserBody -> [u]
gmapQr :: (r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceLogoutFlowWithoutBrowserBody
-> r
$cgmapQr :: forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceLogoutFlowWithoutBrowserBody
-> r
gmapQl :: (r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceLogoutFlowWithoutBrowserBody
-> r
$cgmapQl :: forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceLogoutFlowWithoutBrowserBody
-> r
gmapT :: (forall b. Data b => b -> b)
-> SubmitSelfServiceLogoutFlowWithoutBrowserBody
-> SubmitSelfServiceLogoutFlowWithoutBrowserBody
$cgmapT :: (forall b. Data b => b -> b)
-> SubmitSelfServiceLogoutFlowWithoutBrowserBody
-> SubmitSelfServiceLogoutFlowWithoutBrowserBody
dataCast2 :: (forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceLogoutFlowWithoutBrowserBody)
$cdataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceLogoutFlowWithoutBrowserBody)
dataCast1 :: (forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceLogoutFlowWithoutBrowserBody)
$cdataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceLogoutFlowWithoutBrowserBody)
dataTypeOf :: SubmitSelfServiceLogoutFlowWithoutBrowserBody -> DataType
$cdataTypeOf :: SubmitSelfServiceLogoutFlowWithoutBrowserBody -> DataType
toConstr :: SubmitSelfServiceLogoutFlowWithoutBrowserBody -> Constr
$ctoConstr :: SubmitSelfServiceLogoutFlowWithoutBrowserBody -> Constr
gunfold :: (forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceLogoutFlowWithoutBrowserBody
$cgunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceLogoutFlowWithoutBrowserBody
gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceLogoutFlowWithoutBrowserBody
-> c SubmitSelfServiceLogoutFlowWithoutBrowserBody
$cgfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceLogoutFlowWithoutBrowserBody
-> c SubmitSelfServiceLogoutFlowWithoutBrowserBody
$cp1Data :: Typeable SubmitSelfServiceLogoutFlowWithoutBrowserBody
Data)

instance FromJSON SubmitSelfServiceLogoutFlowWithoutBrowserBody

instance ToJSON SubmitSelfServiceLogoutFlowWithoutBrowserBody where
  toEncoding :: SubmitSelfServiceLogoutFlowWithoutBrowserBody -> Encoding
toEncoding = Options
-> SubmitSelfServiceLogoutFlowWithoutBrowserBody -> Encoding
forall a.
(Generic a, GToJSON' Encoding Zero (Rep a)) =>
Options -> a -> Encoding
genericToEncoding Options
defaultOptions

data SubmitSelfServiceRecoveryFlowBody = SubmitSelfServiceRecoveryFlowBody
  { -- | Sending the anti-csrf token is only required for browser login flows.
    SubmitSelfServiceRecoveryFlowBody -> Maybe Text
csrf_token :: 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
    SubmitSelfServiceRecoveryFlowBody -> Text
email :: Text,
    -- | Method supports `link` only right now.
    SubmitSelfServiceRecoveryFlowBody -> Text
method :: Text
  }
  deriving stock (Int -> SubmitSelfServiceRecoveryFlowBody -> ShowS
[SubmitSelfServiceRecoveryFlowBody] -> ShowS
SubmitSelfServiceRecoveryFlowBody -> String
(Int -> SubmitSelfServiceRecoveryFlowBody -> ShowS)
-> (SubmitSelfServiceRecoveryFlowBody -> String)
-> ([SubmitSelfServiceRecoveryFlowBody] -> ShowS)
-> Show SubmitSelfServiceRecoveryFlowBody
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [SubmitSelfServiceRecoveryFlowBody] -> ShowS
$cshowList :: [SubmitSelfServiceRecoveryFlowBody] -> ShowS
show :: SubmitSelfServiceRecoveryFlowBody -> String
$cshow :: SubmitSelfServiceRecoveryFlowBody -> String
showsPrec :: Int -> SubmitSelfServiceRecoveryFlowBody -> ShowS
$cshowsPrec :: Int -> SubmitSelfServiceRecoveryFlowBody -> ShowS
Show, SubmitSelfServiceRecoveryFlowBody
-> SubmitSelfServiceRecoveryFlowBody -> Bool
(SubmitSelfServiceRecoveryFlowBody
 -> SubmitSelfServiceRecoveryFlowBody -> Bool)
-> (SubmitSelfServiceRecoveryFlowBody
    -> SubmitSelfServiceRecoveryFlowBody -> Bool)
-> Eq SubmitSelfServiceRecoveryFlowBody
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: SubmitSelfServiceRecoveryFlowBody
-> SubmitSelfServiceRecoveryFlowBody -> Bool
$c/= :: SubmitSelfServiceRecoveryFlowBody
-> SubmitSelfServiceRecoveryFlowBody -> Bool
== :: SubmitSelfServiceRecoveryFlowBody
-> SubmitSelfServiceRecoveryFlowBody -> Bool
$c== :: SubmitSelfServiceRecoveryFlowBody
-> SubmitSelfServiceRecoveryFlowBody -> Bool
Eq, (forall x.
 SubmitSelfServiceRecoveryFlowBody
 -> Rep SubmitSelfServiceRecoveryFlowBody x)
-> (forall x.
    Rep SubmitSelfServiceRecoveryFlowBody x
    -> SubmitSelfServiceRecoveryFlowBody)
-> Generic SubmitSelfServiceRecoveryFlowBody
forall x.
Rep SubmitSelfServiceRecoveryFlowBody x
-> SubmitSelfServiceRecoveryFlowBody
forall x.
SubmitSelfServiceRecoveryFlowBody
-> Rep SubmitSelfServiceRecoveryFlowBody x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep SubmitSelfServiceRecoveryFlowBody x
-> SubmitSelfServiceRecoveryFlowBody
$cfrom :: forall x.
SubmitSelfServiceRecoveryFlowBody
-> Rep SubmitSelfServiceRecoveryFlowBody x
Generic, Typeable SubmitSelfServiceRecoveryFlowBody
DataType
Constr
Typeable SubmitSelfServiceRecoveryFlowBody
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g)
    -> SubmitSelfServiceRecoveryFlowBody
    -> c SubmitSelfServiceRecoveryFlowBody)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r)
    -> Constr
    -> c SubmitSelfServiceRecoveryFlowBody)
-> (SubmitSelfServiceRecoveryFlowBody -> Constr)
-> (SubmitSelfServiceRecoveryFlowBody -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d))
    -> Maybe (c SubmitSelfServiceRecoveryFlowBody))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e))
    -> Maybe (c SubmitSelfServiceRecoveryFlowBody))
-> ((forall b. Data b => b -> b)
    -> SubmitSelfServiceRecoveryFlowBody
    -> SubmitSelfServiceRecoveryFlowBody)
-> (forall r r'.
    (r -> r' -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SubmitSelfServiceRecoveryFlowBody
    -> r)
-> (forall r r'.
    (r' -> r -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SubmitSelfServiceRecoveryFlowBody
    -> r)
-> (forall u.
    (forall d. Data d => d -> u)
    -> SubmitSelfServiceRecoveryFlowBody -> [u])
-> (forall u.
    Int
    -> (forall d. Data d => d -> u)
    -> SubmitSelfServiceRecoveryFlowBody
    -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceRecoveryFlowBody
    -> m SubmitSelfServiceRecoveryFlowBody)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceRecoveryFlowBody
    -> m SubmitSelfServiceRecoveryFlowBody)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceRecoveryFlowBody
    -> m SubmitSelfServiceRecoveryFlowBody)
-> Data SubmitSelfServiceRecoveryFlowBody
SubmitSelfServiceRecoveryFlowBody -> DataType
SubmitSelfServiceRecoveryFlowBody -> Constr
(forall b. Data b => b -> b)
-> SubmitSelfServiceRecoveryFlowBody
-> SubmitSelfServiceRecoveryFlowBody
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceRecoveryFlowBody
-> c SubmitSelfServiceRecoveryFlowBody
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceRecoveryFlowBody
forall a.
Typeable a
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g) -> a -> c a)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r) -> Constr -> c a)
-> (a -> Constr)
-> (a -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d)) -> Maybe (c a))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c a))
-> ((forall b. Data b => b -> b) -> a -> a)
-> (forall r r'.
    (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall r r'.
    (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall u. (forall d. Data d => d -> u) -> a -> [u])
-> (forall u. Int -> (forall d. Data d => d -> u) -> a -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> Data a
forall u.
Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceRecoveryFlowBody
-> u
forall u.
(forall d. Data d => d -> u)
-> SubmitSelfServiceRecoveryFlowBody -> [u]
forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceRecoveryFlowBody
-> r
forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceRecoveryFlowBody
-> r
forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceRecoveryFlowBody
-> m SubmitSelfServiceRecoveryFlowBody
forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceRecoveryFlowBody
-> m SubmitSelfServiceRecoveryFlowBody
forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceRecoveryFlowBody
forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceRecoveryFlowBody
-> c SubmitSelfServiceRecoveryFlowBody
forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceRecoveryFlowBody)
forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceRecoveryFlowBody)
$cSubmitSelfServiceRecoveryFlowBody :: Constr
$tSubmitSelfServiceRecoveryFlowBody :: DataType
gmapMo :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceRecoveryFlowBody
-> m SubmitSelfServiceRecoveryFlowBody
$cgmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceRecoveryFlowBody
-> m SubmitSelfServiceRecoveryFlowBody
gmapMp :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceRecoveryFlowBody
-> m SubmitSelfServiceRecoveryFlowBody
$cgmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceRecoveryFlowBody
-> m SubmitSelfServiceRecoveryFlowBody
gmapM :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceRecoveryFlowBody
-> m SubmitSelfServiceRecoveryFlowBody
$cgmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceRecoveryFlowBody
-> m SubmitSelfServiceRecoveryFlowBody
gmapQi :: Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceRecoveryFlowBody
-> u
$cgmapQi :: forall u.
Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceRecoveryFlowBody
-> u
gmapQ :: (forall d. Data d => d -> u)
-> SubmitSelfServiceRecoveryFlowBody -> [u]
$cgmapQ :: forall u.
(forall d. Data d => d -> u)
-> SubmitSelfServiceRecoveryFlowBody -> [u]
gmapQr :: (r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceRecoveryFlowBody
-> r
$cgmapQr :: forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceRecoveryFlowBody
-> r
gmapQl :: (r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceRecoveryFlowBody
-> r
$cgmapQl :: forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceRecoveryFlowBody
-> r
gmapT :: (forall b. Data b => b -> b)
-> SubmitSelfServiceRecoveryFlowBody
-> SubmitSelfServiceRecoveryFlowBody
$cgmapT :: (forall b. Data b => b -> b)
-> SubmitSelfServiceRecoveryFlowBody
-> SubmitSelfServiceRecoveryFlowBody
dataCast2 :: (forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceRecoveryFlowBody)
$cdataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceRecoveryFlowBody)
dataCast1 :: (forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceRecoveryFlowBody)
$cdataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceRecoveryFlowBody)
dataTypeOf :: SubmitSelfServiceRecoveryFlowBody -> DataType
$cdataTypeOf :: SubmitSelfServiceRecoveryFlowBody -> DataType
toConstr :: SubmitSelfServiceRecoveryFlowBody -> Constr
$ctoConstr :: SubmitSelfServiceRecoveryFlowBody -> Constr
gunfold :: (forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceRecoveryFlowBody
$cgunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceRecoveryFlowBody
gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceRecoveryFlowBody
-> c SubmitSelfServiceRecoveryFlowBody
$cgfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceRecoveryFlowBody
-> c SubmitSelfServiceRecoveryFlowBody
$cp1Data :: Typeable SubmitSelfServiceRecoveryFlowBody
Data)

instance FromJSON SubmitSelfServiceRecoveryFlowBody

instance ToJSON SubmitSelfServiceRecoveryFlowBody where
  toEncoding :: SubmitSelfServiceRecoveryFlowBody -> Encoding
toEncoding = Options -> SubmitSelfServiceRecoveryFlowBody -> Encoding
forall a.
(Generic a, GToJSON' Encoding Zero (Rep a)) =>
Options -> a -> Encoding
genericToEncoding Options
defaultOptions

data SubmitSelfServiceRecoveryFlowWithLinkMethodBody = SubmitSelfServiceRecoveryFlowWithLinkMethodBody
  { -- | Sending the anti-csrf token is only required for browser login flows.
    SubmitSelfServiceRecoveryFlowWithLinkMethodBody -> Maybe Text
csrf_token :: 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
    SubmitSelfServiceRecoveryFlowWithLinkMethodBody -> Text
email :: Text,
    -- | Method supports `link` only right now.
    SubmitSelfServiceRecoveryFlowWithLinkMethodBody -> Text
method :: Text
  }
  deriving stock (Int -> SubmitSelfServiceRecoveryFlowWithLinkMethodBody -> ShowS
[SubmitSelfServiceRecoveryFlowWithLinkMethodBody] -> ShowS
SubmitSelfServiceRecoveryFlowWithLinkMethodBody -> String
(Int -> SubmitSelfServiceRecoveryFlowWithLinkMethodBody -> ShowS)
-> (SubmitSelfServiceRecoveryFlowWithLinkMethodBody -> String)
-> ([SubmitSelfServiceRecoveryFlowWithLinkMethodBody] -> ShowS)
-> Show SubmitSelfServiceRecoveryFlowWithLinkMethodBody
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [SubmitSelfServiceRecoveryFlowWithLinkMethodBody] -> ShowS
$cshowList :: [SubmitSelfServiceRecoveryFlowWithLinkMethodBody] -> ShowS
show :: SubmitSelfServiceRecoveryFlowWithLinkMethodBody -> String
$cshow :: SubmitSelfServiceRecoveryFlowWithLinkMethodBody -> String
showsPrec :: Int -> SubmitSelfServiceRecoveryFlowWithLinkMethodBody -> ShowS
$cshowsPrec :: Int -> SubmitSelfServiceRecoveryFlowWithLinkMethodBody -> ShowS
Show, SubmitSelfServiceRecoveryFlowWithLinkMethodBody
-> SubmitSelfServiceRecoveryFlowWithLinkMethodBody -> Bool
(SubmitSelfServiceRecoveryFlowWithLinkMethodBody
 -> SubmitSelfServiceRecoveryFlowWithLinkMethodBody -> Bool)
-> (SubmitSelfServiceRecoveryFlowWithLinkMethodBody
    -> SubmitSelfServiceRecoveryFlowWithLinkMethodBody -> Bool)
-> Eq SubmitSelfServiceRecoveryFlowWithLinkMethodBody
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: SubmitSelfServiceRecoveryFlowWithLinkMethodBody
-> SubmitSelfServiceRecoveryFlowWithLinkMethodBody -> Bool
$c/= :: SubmitSelfServiceRecoveryFlowWithLinkMethodBody
-> SubmitSelfServiceRecoveryFlowWithLinkMethodBody -> Bool
== :: SubmitSelfServiceRecoveryFlowWithLinkMethodBody
-> SubmitSelfServiceRecoveryFlowWithLinkMethodBody -> Bool
$c== :: SubmitSelfServiceRecoveryFlowWithLinkMethodBody
-> SubmitSelfServiceRecoveryFlowWithLinkMethodBody -> Bool
Eq, (forall x.
 SubmitSelfServiceRecoveryFlowWithLinkMethodBody
 -> Rep SubmitSelfServiceRecoveryFlowWithLinkMethodBody x)
-> (forall x.
    Rep SubmitSelfServiceRecoveryFlowWithLinkMethodBody x
    -> SubmitSelfServiceRecoveryFlowWithLinkMethodBody)
-> Generic SubmitSelfServiceRecoveryFlowWithLinkMethodBody
forall x.
Rep SubmitSelfServiceRecoveryFlowWithLinkMethodBody x
-> SubmitSelfServiceRecoveryFlowWithLinkMethodBody
forall x.
SubmitSelfServiceRecoveryFlowWithLinkMethodBody
-> Rep SubmitSelfServiceRecoveryFlowWithLinkMethodBody x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep SubmitSelfServiceRecoveryFlowWithLinkMethodBody x
-> SubmitSelfServiceRecoveryFlowWithLinkMethodBody
$cfrom :: forall x.
SubmitSelfServiceRecoveryFlowWithLinkMethodBody
-> Rep SubmitSelfServiceRecoveryFlowWithLinkMethodBody x
Generic, Typeable SubmitSelfServiceRecoveryFlowWithLinkMethodBody
DataType
Constr
Typeable SubmitSelfServiceRecoveryFlowWithLinkMethodBody
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g)
    -> SubmitSelfServiceRecoveryFlowWithLinkMethodBody
    -> c SubmitSelfServiceRecoveryFlowWithLinkMethodBody)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r)
    -> Constr
    -> c SubmitSelfServiceRecoveryFlowWithLinkMethodBody)
-> (SubmitSelfServiceRecoveryFlowWithLinkMethodBody -> Constr)
-> (SubmitSelfServiceRecoveryFlowWithLinkMethodBody -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d))
    -> Maybe (c SubmitSelfServiceRecoveryFlowWithLinkMethodBody))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e))
    -> Maybe (c SubmitSelfServiceRecoveryFlowWithLinkMethodBody))
-> ((forall b. Data b => b -> b)
    -> SubmitSelfServiceRecoveryFlowWithLinkMethodBody
    -> SubmitSelfServiceRecoveryFlowWithLinkMethodBody)
-> (forall r r'.
    (r -> r' -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SubmitSelfServiceRecoveryFlowWithLinkMethodBody
    -> r)
-> (forall r r'.
    (r' -> r -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SubmitSelfServiceRecoveryFlowWithLinkMethodBody
    -> r)
-> (forall u.
    (forall d. Data d => d -> u)
    -> SubmitSelfServiceRecoveryFlowWithLinkMethodBody -> [u])
-> (forall u.
    Int
    -> (forall d. Data d => d -> u)
    -> SubmitSelfServiceRecoveryFlowWithLinkMethodBody
    -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceRecoveryFlowWithLinkMethodBody
    -> m SubmitSelfServiceRecoveryFlowWithLinkMethodBody)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceRecoveryFlowWithLinkMethodBody
    -> m SubmitSelfServiceRecoveryFlowWithLinkMethodBody)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceRecoveryFlowWithLinkMethodBody
    -> m SubmitSelfServiceRecoveryFlowWithLinkMethodBody)
-> Data SubmitSelfServiceRecoveryFlowWithLinkMethodBody
SubmitSelfServiceRecoveryFlowWithLinkMethodBody -> DataType
SubmitSelfServiceRecoveryFlowWithLinkMethodBody -> Constr
(forall b. Data b => b -> b)
-> SubmitSelfServiceRecoveryFlowWithLinkMethodBody
-> SubmitSelfServiceRecoveryFlowWithLinkMethodBody
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceRecoveryFlowWithLinkMethodBody
-> c SubmitSelfServiceRecoveryFlowWithLinkMethodBody
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceRecoveryFlowWithLinkMethodBody
forall a.
Typeable a
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g) -> a -> c a)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r) -> Constr -> c a)
-> (a -> Constr)
-> (a -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d)) -> Maybe (c a))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c a))
-> ((forall b. Data b => b -> b) -> a -> a)
-> (forall r r'.
    (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall r r'.
    (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall u. (forall d. Data d => d -> u) -> a -> [u])
-> (forall u. Int -> (forall d. Data d => d -> u) -> a -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> Data a
forall u.
Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceRecoveryFlowWithLinkMethodBody
-> u
forall u.
(forall d. Data d => d -> u)
-> SubmitSelfServiceRecoveryFlowWithLinkMethodBody -> [u]
forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceRecoveryFlowWithLinkMethodBody
-> r
forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceRecoveryFlowWithLinkMethodBody
-> r
forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceRecoveryFlowWithLinkMethodBody
-> m SubmitSelfServiceRecoveryFlowWithLinkMethodBody
forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceRecoveryFlowWithLinkMethodBody
-> m SubmitSelfServiceRecoveryFlowWithLinkMethodBody
forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceRecoveryFlowWithLinkMethodBody
forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceRecoveryFlowWithLinkMethodBody
-> c SubmitSelfServiceRecoveryFlowWithLinkMethodBody
forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceRecoveryFlowWithLinkMethodBody)
forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceRecoveryFlowWithLinkMethodBody)
$cSubmitSelfServiceRecoveryFlowWithLinkMethodBody :: Constr
$tSubmitSelfServiceRecoveryFlowWithLinkMethodBody :: DataType
gmapMo :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceRecoveryFlowWithLinkMethodBody
-> m SubmitSelfServiceRecoveryFlowWithLinkMethodBody
$cgmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceRecoveryFlowWithLinkMethodBody
-> m SubmitSelfServiceRecoveryFlowWithLinkMethodBody
gmapMp :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceRecoveryFlowWithLinkMethodBody
-> m SubmitSelfServiceRecoveryFlowWithLinkMethodBody
$cgmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceRecoveryFlowWithLinkMethodBody
-> m SubmitSelfServiceRecoveryFlowWithLinkMethodBody
gmapM :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceRecoveryFlowWithLinkMethodBody
-> m SubmitSelfServiceRecoveryFlowWithLinkMethodBody
$cgmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceRecoveryFlowWithLinkMethodBody
-> m SubmitSelfServiceRecoveryFlowWithLinkMethodBody
gmapQi :: Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceRecoveryFlowWithLinkMethodBody
-> u
$cgmapQi :: forall u.
Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceRecoveryFlowWithLinkMethodBody
-> u
gmapQ :: (forall d. Data d => d -> u)
-> SubmitSelfServiceRecoveryFlowWithLinkMethodBody -> [u]
$cgmapQ :: forall u.
(forall d. Data d => d -> u)
-> SubmitSelfServiceRecoveryFlowWithLinkMethodBody -> [u]
gmapQr :: (r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceRecoveryFlowWithLinkMethodBody
-> r
$cgmapQr :: forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceRecoveryFlowWithLinkMethodBody
-> r
gmapQl :: (r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceRecoveryFlowWithLinkMethodBody
-> r
$cgmapQl :: forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceRecoveryFlowWithLinkMethodBody
-> r
gmapT :: (forall b. Data b => b -> b)
-> SubmitSelfServiceRecoveryFlowWithLinkMethodBody
-> SubmitSelfServiceRecoveryFlowWithLinkMethodBody
$cgmapT :: (forall b. Data b => b -> b)
-> SubmitSelfServiceRecoveryFlowWithLinkMethodBody
-> SubmitSelfServiceRecoveryFlowWithLinkMethodBody
dataCast2 :: (forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceRecoveryFlowWithLinkMethodBody)
$cdataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceRecoveryFlowWithLinkMethodBody)
dataCast1 :: (forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceRecoveryFlowWithLinkMethodBody)
$cdataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceRecoveryFlowWithLinkMethodBody)
dataTypeOf :: SubmitSelfServiceRecoveryFlowWithLinkMethodBody -> DataType
$cdataTypeOf :: SubmitSelfServiceRecoveryFlowWithLinkMethodBody -> DataType
toConstr :: SubmitSelfServiceRecoveryFlowWithLinkMethodBody -> Constr
$ctoConstr :: SubmitSelfServiceRecoveryFlowWithLinkMethodBody -> Constr
gunfold :: (forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceRecoveryFlowWithLinkMethodBody
$cgunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceRecoveryFlowWithLinkMethodBody
gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceRecoveryFlowWithLinkMethodBody
-> c SubmitSelfServiceRecoveryFlowWithLinkMethodBody
$cgfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceRecoveryFlowWithLinkMethodBody
-> c SubmitSelfServiceRecoveryFlowWithLinkMethodBody
$cp1Data :: Typeable SubmitSelfServiceRecoveryFlowWithLinkMethodBody
Data)

instance FromJSON SubmitSelfServiceRecoveryFlowWithLinkMethodBody

instance ToJSON SubmitSelfServiceRecoveryFlowWithLinkMethodBody where
  toEncoding :: SubmitSelfServiceRecoveryFlowWithLinkMethodBody -> Encoding
toEncoding = Options
-> SubmitSelfServiceRecoveryFlowWithLinkMethodBody -> Encoding
forall a.
(Generic a, GToJSON' Encoding Zero (Rep a)) =>
Options -> a -> Encoding
genericToEncoding Options
defaultOptions

data SubmitSelfServiceRegistrationFlowBody = SubmitSelfServiceRegistrationFlowBody
  { -- | CSRFToken is the anti-CSRF token
    SubmitSelfServiceRegistrationFlowBody -> Maybe Text
csrf_token :: Maybe Text,
    -- | Method  Should be set to \"webauthn\" when trying to add, update, or remove a webAuthn pairing.
    SubmitSelfServiceRegistrationFlowBody -> Text
method :: Text,
    -- | Password to sign the user up with
    SubmitSelfServiceRegistrationFlowBody -> Text
password :: Text,
    -- | The identity's traits
    SubmitSelfServiceRegistrationFlowBody -> Value
traits :: Value,
    -- | The provider to register with
    SubmitSelfServiceRegistrationFlowBody -> Text
provider :: Text,
    -- | Register a WebAuthn Security Key  It is expected that the JSON returned by the WebAuthn registration process is included here.
    SubmitSelfServiceRegistrationFlowBody -> Maybe Text
webauthn_register :: Maybe Text,
    -- | Name of the WebAuthn Security Key to be Added  A human-readable name for the security key which will be added.
    SubmitSelfServiceRegistrationFlowBody -> Maybe Text
webauthn_register_displayname :: Maybe Text
  }
  deriving stock (Int -> SubmitSelfServiceRegistrationFlowBody -> ShowS
[SubmitSelfServiceRegistrationFlowBody] -> ShowS
SubmitSelfServiceRegistrationFlowBody -> String
(Int -> SubmitSelfServiceRegistrationFlowBody -> ShowS)
-> (SubmitSelfServiceRegistrationFlowBody -> String)
-> ([SubmitSelfServiceRegistrationFlowBody] -> ShowS)
-> Show SubmitSelfServiceRegistrationFlowBody
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [SubmitSelfServiceRegistrationFlowBody] -> ShowS
$cshowList :: [SubmitSelfServiceRegistrationFlowBody] -> ShowS
show :: SubmitSelfServiceRegistrationFlowBody -> String
$cshow :: SubmitSelfServiceRegistrationFlowBody -> String
showsPrec :: Int -> SubmitSelfServiceRegistrationFlowBody -> ShowS
$cshowsPrec :: Int -> SubmitSelfServiceRegistrationFlowBody -> ShowS
Show, SubmitSelfServiceRegistrationFlowBody
-> SubmitSelfServiceRegistrationFlowBody -> Bool
(SubmitSelfServiceRegistrationFlowBody
 -> SubmitSelfServiceRegistrationFlowBody -> Bool)
-> (SubmitSelfServiceRegistrationFlowBody
    -> SubmitSelfServiceRegistrationFlowBody -> Bool)
-> Eq SubmitSelfServiceRegistrationFlowBody
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: SubmitSelfServiceRegistrationFlowBody
-> SubmitSelfServiceRegistrationFlowBody -> Bool
$c/= :: SubmitSelfServiceRegistrationFlowBody
-> SubmitSelfServiceRegistrationFlowBody -> Bool
== :: SubmitSelfServiceRegistrationFlowBody
-> SubmitSelfServiceRegistrationFlowBody -> Bool
$c== :: SubmitSelfServiceRegistrationFlowBody
-> SubmitSelfServiceRegistrationFlowBody -> Bool
Eq, (forall x.
 SubmitSelfServiceRegistrationFlowBody
 -> Rep SubmitSelfServiceRegistrationFlowBody x)
-> (forall x.
    Rep SubmitSelfServiceRegistrationFlowBody x
    -> SubmitSelfServiceRegistrationFlowBody)
-> Generic SubmitSelfServiceRegistrationFlowBody
forall x.
Rep SubmitSelfServiceRegistrationFlowBody x
-> SubmitSelfServiceRegistrationFlowBody
forall x.
SubmitSelfServiceRegistrationFlowBody
-> Rep SubmitSelfServiceRegistrationFlowBody x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep SubmitSelfServiceRegistrationFlowBody x
-> SubmitSelfServiceRegistrationFlowBody
$cfrom :: forall x.
SubmitSelfServiceRegistrationFlowBody
-> Rep SubmitSelfServiceRegistrationFlowBody x
Generic, Typeable SubmitSelfServiceRegistrationFlowBody
DataType
Constr
Typeable SubmitSelfServiceRegistrationFlowBody
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g)
    -> SubmitSelfServiceRegistrationFlowBody
    -> c SubmitSelfServiceRegistrationFlowBody)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r)
    -> Constr
    -> c SubmitSelfServiceRegistrationFlowBody)
-> (SubmitSelfServiceRegistrationFlowBody -> Constr)
-> (SubmitSelfServiceRegistrationFlowBody -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d))
    -> Maybe (c SubmitSelfServiceRegistrationFlowBody))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e))
    -> Maybe (c SubmitSelfServiceRegistrationFlowBody))
-> ((forall b. Data b => b -> b)
    -> SubmitSelfServiceRegistrationFlowBody
    -> SubmitSelfServiceRegistrationFlowBody)
-> (forall r r'.
    (r -> r' -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SubmitSelfServiceRegistrationFlowBody
    -> r)
-> (forall r r'.
    (r' -> r -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SubmitSelfServiceRegistrationFlowBody
    -> r)
-> (forall u.
    (forall d. Data d => d -> u)
    -> SubmitSelfServiceRegistrationFlowBody -> [u])
-> (forall u.
    Int
    -> (forall d. Data d => d -> u)
    -> SubmitSelfServiceRegistrationFlowBody
    -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceRegistrationFlowBody
    -> m SubmitSelfServiceRegistrationFlowBody)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceRegistrationFlowBody
    -> m SubmitSelfServiceRegistrationFlowBody)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceRegistrationFlowBody
    -> m SubmitSelfServiceRegistrationFlowBody)
-> Data SubmitSelfServiceRegistrationFlowBody
SubmitSelfServiceRegistrationFlowBody -> DataType
SubmitSelfServiceRegistrationFlowBody -> Constr
(forall b. Data b => b -> b)
-> SubmitSelfServiceRegistrationFlowBody
-> SubmitSelfServiceRegistrationFlowBody
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceRegistrationFlowBody
-> c SubmitSelfServiceRegistrationFlowBody
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceRegistrationFlowBody
forall a.
Typeable a
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g) -> a -> c a)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r) -> Constr -> c a)
-> (a -> Constr)
-> (a -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d)) -> Maybe (c a))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c a))
-> ((forall b. Data b => b -> b) -> a -> a)
-> (forall r r'.
    (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall r r'.
    (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall u. (forall d. Data d => d -> u) -> a -> [u])
-> (forall u. Int -> (forall d. Data d => d -> u) -> a -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> Data a
forall u.
Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceRegistrationFlowBody
-> u
forall u.
(forall d. Data d => d -> u)
-> SubmitSelfServiceRegistrationFlowBody -> [u]
forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceRegistrationFlowBody
-> r
forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceRegistrationFlowBody
-> r
forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceRegistrationFlowBody
-> m SubmitSelfServiceRegistrationFlowBody
forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceRegistrationFlowBody
-> m SubmitSelfServiceRegistrationFlowBody
forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceRegistrationFlowBody
forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceRegistrationFlowBody
-> c SubmitSelfServiceRegistrationFlowBody
forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceRegistrationFlowBody)
forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceRegistrationFlowBody)
$cSubmitSelfServiceRegistrationFlowBody :: Constr
$tSubmitSelfServiceRegistrationFlowBody :: DataType
gmapMo :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceRegistrationFlowBody
-> m SubmitSelfServiceRegistrationFlowBody
$cgmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceRegistrationFlowBody
-> m SubmitSelfServiceRegistrationFlowBody
gmapMp :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceRegistrationFlowBody
-> m SubmitSelfServiceRegistrationFlowBody
$cgmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceRegistrationFlowBody
-> m SubmitSelfServiceRegistrationFlowBody
gmapM :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceRegistrationFlowBody
-> m SubmitSelfServiceRegistrationFlowBody
$cgmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceRegistrationFlowBody
-> m SubmitSelfServiceRegistrationFlowBody
gmapQi :: Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceRegistrationFlowBody
-> u
$cgmapQi :: forall u.
Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceRegistrationFlowBody
-> u
gmapQ :: (forall d. Data d => d -> u)
-> SubmitSelfServiceRegistrationFlowBody -> [u]
$cgmapQ :: forall u.
(forall d. Data d => d -> u)
-> SubmitSelfServiceRegistrationFlowBody -> [u]
gmapQr :: (r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceRegistrationFlowBody
-> r
$cgmapQr :: forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceRegistrationFlowBody
-> r
gmapQl :: (r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceRegistrationFlowBody
-> r
$cgmapQl :: forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceRegistrationFlowBody
-> r
gmapT :: (forall b. Data b => b -> b)
-> SubmitSelfServiceRegistrationFlowBody
-> SubmitSelfServiceRegistrationFlowBody
$cgmapT :: (forall b. Data b => b -> b)
-> SubmitSelfServiceRegistrationFlowBody
-> SubmitSelfServiceRegistrationFlowBody
dataCast2 :: (forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceRegistrationFlowBody)
$cdataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceRegistrationFlowBody)
dataCast1 :: (forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceRegistrationFlowBody)
$cdataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceRegistrationFlowBody)
dataTypeOf :: SubmitSelfServiceRegistrationFlowBody -> DataType
$cdataTypeOf :: SubmitSelfServiceRegistrationFlowBody -> DataType
toConstr :: SubmitSelfServiceRegistrationFlowBody -> Constr
$ctoConstr :: SubmitSelfServiceRegistrationFlowBody -> Constr
gunfold :: (forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceRegistrationFlowBody
$cgunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceRegistrationFlowBody
gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceRegistrationFlowBody
-> c SubmitSelfServiceRegistrationFlowBody
$cgfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceRegistrationFlowBody
-> c SubmitSelfServiceRegistrationFlowBody
$cp1Data :: Typeable SubmitSelfServiceRegistrationFlowBody
Data)

instance FromJSON SubmitSelfServiceRegistrationFlowBody

instance ToJSON SubmitSelfServiceRegistrationFlowBody where
  toEncoding :: SubmitSelfServiceRegistrationFlowBody -> Encoding
toEncoding = Options -> SubmitSelfServiceRegistrationFlowBody -> Encoding
forall a.
(Generic a, GToJSON' Encoding Zero (Rep a)) =>
Options -> a -> Encoding
genericToEncoding Options
defaultOptions

-- | SubmitSelfServiceRegistrationFlowWithOidcMethodBody is used to decode the registration form payload when using the oidc method.
data SubmitSelfServiceRegistrationFlowWithOidcMethodBody = SubmitSelfServiceRegistrationFlowWithOidcMethodBody
  { -- | The CSRF Token
    SubmitSelfServiceRegistrationFlowWithOidcMethodBody -> Maybe Text
csrf_token :: Maybe Text,
    -- | Method to use  This field must be set to `oidc` when using the oidc method.
    SubmitSelfServiceRegistrationFlowWithOidcMethodBody -> Text
method :: Text,
    -- | The provider to register with
    SubmitSelfServiceRegistrationFlowWithOidcMethodBody -> Text
provider :: Text,
    -- | The identity traits
    SubmitSelfServiceRegistrationFlowWithOidcMethodBody -> Maybe Value
traits :: Maybe Value
  }
  deriving stock (Int -> SubmitSelfServiceRegistrationFlowWithOidcMethodBody -> ShowS
[SubmitSelfServiceRegistrationFlowWithOidcMethodBody] -> ShowS
SubmitSelfServiceRegistrationFlowWithOidcMethodBody -> String
(Int
 -> SubmitSelfServiceRegistrationFlowWithOidcMethodBody -> ShowS)
-> (SubmitSelfServiceRegistrationFlowWithOidcMethodBody -> String)
-> ([SubmitSelfServiceRegistrationFlowWithOidcMethodBody] -> ShowS)
-> Show SubmitSelfServiceRegistrationFlowWithOidcMethodBody
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [SubmitSelfServiceRegistrationFlowWithOidcMethodBody] -> ShowS
$cshowList :: [SubmitSelfServiceRegistrationFlowWithOidcMethodBody] -> ShowS
show :: SubmitSelfServiceRegistrationFlowWithOidcMethodBody -> String
$cshow :: SubmitSelfServiceRegistrationFlowWithOidcMethodBody -> String
showsPrec :: Int -> SubmitSelfServiceRegistrationFlowWithOidcMethodBody -> ShowS
$cshowsPrec :: Int -> SubmitSelfServiceRegistrationFlowWithOidcMethodBody -> ShowS
Show, SubmitSelfServiceRegistrationFlowWithOidcMethodBody
-> SubmitSelfServiceRegistrationFlowWithOidcMethodBody -> Bool
(SubmitSelfServiceRegistrationFlowWithOidcMethodBody
 -> SubmitSelfServiceRegistrationFlowWithOidcMethodBody -> Bool)
-> (SubmitSelfServiceRegistrationFlowWithOidcMethodBody
    -> SubmitSelfServiceRegistrationFlowWithOidcMethodBody -> Bool)
-> Eq SubmitSelfServiceRegistrationFlowWithOidcMethodBody
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: SubmitSelfServiceRegistrationFlowWithOidcMethodBody
-> SubmitSelfServiceRegistrationFlowWithOidcMethodBody -> Bool
$c/= :: SubmitSelfServiceRegistrationFlowWithOidcMethodBody
-> SubmitSelfServiceRegistrationFlowWithOidcMethodBody -> Bool
== :: SubmitSelfServiceRegistrationFlowWithOidcMethodBody
-> SubmitSelfServiceRegistrationFlowWithOidcMethodBody -> Bool
$c== :: SubmitSelfServiceRegistrationFlowWithOidcMethodBody
-> SubmitSelfServiceRegistrationFlowWithOidcMethodBody -> Bool
Eq, (forall x.
 SubmitSelfServiceRegistrationFlowWithOidcMethodBody
 -> Rep SubmitSelfServiceRegistrationFlowWithOidcMethodBody x)
-> (forall x.
    Rep SubmitSelfServiceRegistrationFlowWithOidcMethodBody x
    -> SubmitSelfServiceRegistrationFlowWithOidcMethodBody)
-> Generic SubmitSelfServiceRegistrationFlowWithOidcMethodBody
forall x.
Rep SubmitSelfServiceRegistrationFlowWithOidcMethodBody x
-> SubmitSelfServiceRegistrationFlowWithOidcMethodBody
forall x.
SubmitSelfServiceRegistrationFlowWithOidcMethodBody
-> Rep SubmitSelfServiceRegistrationFlowWithOidcMethodBody x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep SubmitSelfServiceRegistrationFlowWithOidcMethodBody x
-> SubmitSelfServiceRegistrationFlowWithOidcMethodBody
$cfrom :: forall x.
SubmitSelfServiceRegistrationFlowWithOidcMethodBody
-> Rep SubmitSelfServiceRegistrationFlowWithOidcMethodBody x
Generic, Typeable SubmitSelfServiceRegistrationFlowWithOidcMethodBody
DataType
Constr
Typeable SubmitSelfServiceRegistrationFlowWithOidcMethodBody
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g)
    -> SubmitSelfServiceRegistrationFlowWithOidcMethodBody
    -> c SubmitSelfServiceRegistrationFlowWithOidcMethodBody)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r)
    -> Constr
    -> c SubmitSelfServiceRegistrationFlowWithOidcMethodBody)
-> (SubmitSelfServiceRegistrationFlowWithOidcMethodBody -> Constr)
-> (SubmitSelfServiceRegistrationFlowWithOidcMethodBody
    -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d))
    -> Maybe (c SubmitSelfServiceRegistrationFlowWithOidcMethodBody))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e))
    -> Maybe (c SubmitSelfServiceRegistrationFlowWithOidcMethodBody))
-> ((forall b. Data b => b -> b)
    -> SubmitSelfServiceRegistrationFlowWithOidcMethodBody
    -> SubmitSelfServiceRegistrationFlowWithOidcMethodBody)
-> (forall r r'.
    (r -> r' -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SubmitSelfServiceRegistrationFlowWithOidcMethodBody
    -> r)
-> (forall r r'.
    (r' -> r -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SubmitSelfServiceRegistrationFlowWithOidcMethodBody
    -> r)
-> (forall u.
    (forall d. Data d => d -> u)
    -> SubmitSelfServiceRegistrationFlowWithOidcMethodBody -> [u])
-> (forall u.
    Int
    -> (forall d. Data d => d -> u)
    -> SubmitSelfServiceRegistrationFlowWithOidcMethodBody
    -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceRegistrationFlowWithOidcMethodBody
    -> m SubmitSelfServiceRegistrationFlowWithOidcMethodBody)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceRegistrationFlowWithOidcMethodBody
    -> m SubmitSelfServiceRegistrationFlowWithOidcMethodBody)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceRegistrationFlowWithOidcMethodBody
    -> m SubmitSelfServiceRegistrationFlowWithOidcMethodBody)
-> Data SubmitSelfServiceRegistrationFlowWithOidcMethodBody
SubmitSelfServiceRegistrationFlowWithOidcMethodBody -> DataType
SubmitSelfServiceRegistrationFlowWithOidcMethodBody -> Constr
(forall b. Data b => b -> b)
-> SubmitSelfServiceRegistrationFlowWithOidcMethodBody
-> SubmitSelfServiceRegistrationFlowWithOidcMethodBody
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceRegistrationFlowWithOidcMethodBody
-> c SubmitSelfServiceRegistrationFlowWithOidcMethodBody
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceRegistrationFlowWithOidcMethodBody
forall a.
Typeable a
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g) -> a -> c a)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r) -> Constr -> c a)
-> (a -> Constr)
-> (a -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d)) -> Maybe (c a))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c a))
-> ((forall b. Data b => b -> b) -> a -> a)
-> (forall r r'.
    (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall r r'.
    (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall u. (forall d. Data d => d -> u) -> a -> [u])
-> (forall u. Int -> (forall d. Data d => d -> u) -> a -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> Data a
forall u.
Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceRegistrationFlowWithOidcMethodBody
-> u
forall u.
(forall d. Data d => d -> u)
-> SubmitSelfServiceRegistrationFlowWithOidcMethodBody -> [u]
forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceRegistrationFlowWithOidcMethodBody
-> r
forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceRegistrationFlowWithOidcMethodBody
-> r
forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceRegistrationFlowWithOidcMethodBody
-> m SubmitSelfServiceRegistrationFlowWithOidcMethodBody
forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceRegistrationFlowWithOidcMethodBody
-> m SubmitSelfServiceRegistrationFlowWithOidcMethodBody
forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceRegistrationFlowWithOidcMethodBody
forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceRegistrationFlowWithOidcMethodBody
-> c SubmitSelfServiceRegistrationFlowWithOidcMethodBody
forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceRegistrationFlowWithOidcMethodBody)
forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceRegistrationFlowWithOidcMethodBody)
$cSubmitSelfServiceRegistrationFlowWithOidcMethodBody :: Constr
$tSubmitSelfServiceRegistrationFlowWithOidcMethodBody :: DataType
gmapMo :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceRegistrationFlowWithOidcMethodBody
-> m SubmitSelfServiceRegistrationFlowWithOidcMethodBody
$cgmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceRegistrationFlowWithOidcMethodBody
-> m SubmitSelfServiceRegistrationFlowWithOidcMethodBody
gmapMp :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceRegistrationFlowWithOidcMethodBody
-> m SubmitSelfServiceRegistrationFlowWithOidcMethodBody
$cgmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceRegistrationFlowWithOidcMethodBody
-> m SubmitSelfServiceRegistrationFlowWithOidcMethodBody
gmapM :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceRegistrationFlowWithOidcMethodBody
-> m SubmitSelfServiceRegistrationFlowWithOidcMethodBody
$cgmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceRegistrationFlowWithOidcMethodBody
-> m SubmitSelfServiceRegistrationFlowWithOidcMethodBody
gmapQi :: Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceRegistrationFlowWithOidcMethodBody
-> u
$cgmapQi :: forall u.
Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceRegistrationFlowWithOidcMethodBody
-> u
gmapQ :: (forall d. Data d => d -> u)
-> SubmitSelfServiceRegistrationFlowWithOidcMethodBody -> [u]
$cgmapQ :: forall u.
(forall d. Data d => d -> u)
-> SubmitSelfServiceRegistrationFlowWithOidcMethodBody -> [u]
gmapQr :: (r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceRegistrationFlowWithOidcMethodBody
-> r
$cgmapQr :: forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceRegistrationFlowWithOidcMethodBody
-> r
gmapQl :: (r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceRegistrationFlowWithOidcMethodBody
-> r
$cgmapQl :: forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceRegistrationFlowWithOidcMethodBody
-> r
gmapT :: (forall b. Data b => b -> b)
-> SubmitSelfServiceRegistrationFlowWithOidcMethodBody
-> SubmitSelfServiceRegistrationFlowWithOidcMethodBody
$cgmapT :: (forall b. Data b => b -> b)
-> SubmitSelfServiceRegistrationFlowWithOidcMethodBody
-> SubmitSelfServiceRegistrationFlowWithOidcMethodBody
dataCast2 :: (forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceRegistrationFlowWithOidcMethodBody)
$cdataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceRegistrationFlowWithOidcMethodBody)
dataCast1 :: (forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceRegistrationFlowWithOidcMethodBody)
$cdataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceRegistrationFlowWithOidcMethodBody)
dataTypeOf :: SubmitSelfServiceRegistrationFlowWithOidcMethodBody -> DataType
$cdataTypeOf :: SubmitSelfServiceRegistrationFlowWithOidcMethodBody -> DataType
toConstr :: SubmitSelfServiceRegistrationFlowWithOidcMethodBody -> Constr
$ctoConstr :: SubmitSelfServiceRegistrationFlowWithOidcMethodBody -> Constr
gunfold :: (forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceRegistrationFlowWithOidcMethodBody
$cgunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceRegistrationFlowWithOidcMethodBody
gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceRegistrationFlowWithOidcMethodBody
-> c SubmitSelfServiceRegistrationFlowWithOidcMethodBody
$cgfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceRegistrationFlowWithOidcMethodBody
-> c SubmitSelfServiceRegistrationFlowWithOidcMethodBody
$cp1Data :: Typeable SubmitSelfServiceRegistrationFlowWithOidcMethodBody
Data)

instance FromJSON SubmitSelfServiceRegistrationFlowWithOidcMethodBody

instance ToJSON SubmitSelfServiceRegistrationFlowWithOidcMethodBody where
  toEncoding :: SubmitSelfServiceRegistrationFlowWithOidcMethodBody -> Encoding
toEncoding = Options
-> SubmitSelfServiceRegistrationFlowWithOidcMethodBody -> Encoding
forall a.
(Generic a, GToJSON' Encoding Zero (Rep a)) =>
Options -> a -> Encoding
genericToEncoding Options
defaultOptions

-- | SubmitSelfServiceRegistrationFlowWithPasswordMethodBody is used to decode the registration form payload when using the password method.
data SubmitSelfServiceRegistrationFlowWithPasswordMethodBody = SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
  { -- | The CSRF Token
    SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
-> Maybe Text
csrf_token :: Maybe Text,
    -- | Method to use  This field must be set to `password` when using the password method.
    SubmitSelfServiceRegistrationFlowWithPasswordMethodBody -> Text
method :: Text,
    -- | Password to sign the user up with
    SubmitSelfServiceRegistrationFlowWithPasswordMethodBody -> Text
password :: Text,
    -- | The identity's traits
    SubmitSelfServiceRegistrationFlowWithPasswordMethodBody -> Value
traits :: Value
  }
  deriving stock (Int
-> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody -> ShowS
[SubmitSelfServiceRegistrationFlowWithPasswordMethodBody] -> ShowS
SubmitSelfServiceRegistrationFlowWithPasswordMethodBody -> String
(Int
 -> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
 -> ShowS)
-> (SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
    -> String)
-> ([SubmitSelfServiceRegistrationFlowWithPasswordMethodBody]
    -> ShowS)
-> Show SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [SubmitSelfServiceRegistrationFlowWithPasswordMethodBody] -> ShowS
$cshowList :: [SubmitSelfServiceRegistrationFlowWithPasswordMethodBody] -> ShowS
show :: SubmitSelfServiceRegistrationFlowWithPasswordMethodBody -> String
$cshow :: SubmitSelfServiceRegistrationFlowWithPasswordMethodBody -> String
showsPrec :: Int
-> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody -> ShowS
$cshowsPrec :: Int
-> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody -> ShowS
Show, SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
-> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody -> Bool
(SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
 -> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody -> Bool)
-> (SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
    -> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody -> Bool)
-> Eq SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
-> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody -> Bool
$c/= :: SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
-> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody -> Bool
== :: SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
-> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody -> Bool
$c== :: SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
-> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody -> Bool
Eq, (forall x.
 SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
 -> Rep SubmitSelfServiceRegistrationFlowWithPasswordMethodBody x)
-> (forall x.
    Rep SubmitSelfServiceRegistrationFlowWithPasswordMethodBody x
    -> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody)
-> Generic SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
forall x.
Rep SubmitSelfServiceRegistrationFlowWithPasswordMethodBody x
-> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
forall x.
SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
-> Rep SubmitSelfServiceRegistrationFlowWithPasswordMethodBody x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep SubmitSelfServiceRegistrationFlowWithPasswordMethodBody x
-> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
$cfrom :: forall x.
SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
-> Rep SubmitSelfServiceRegistrationFlowWithPasswordMethodBody x
Generic, Typeable SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
DataType
Constr
Typeable SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g)
    -> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
    -> c SubmitSelfServiceRegistrationFlowWithPasswordMethodBody)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r)
    -> Constr
    -> c SubmitSelfServiceRegistrationFlowWithPasswordMethodBody)
-> (SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
    -> Constr)
-> (SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
    -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d))
    -> Maybe
         (c SubmitSelfServiceRegistrationFlowWithPasswordMethodBody))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e))
    -> Maybe
         (c SubmitSelfServiceRegistrationFlowWithPasswordMethodBody))
-> ((forall b. Data b => b -> b)
    -> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
    -> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody)
-> (forall r r'.
    (r -> r' -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
    -> r)
-> (forall r r'.
    (r' -> r -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
    -> r)
-> (forall u.
    (forall d. Data d => d -> u)
    -> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody -> [u])
-> (forall u.
    Int
    -> (forall d. Data d => d -> u)
    -> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
    -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
    -> m SubmitSelfServiceRegistrationFlowWithPasswordMethodBody)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
    -> m SubmitSelfServiceRegistrationFlowWithPasswordMethodBody)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
    -> m SubmitSelfServiceRegistrationFlowWithPasswordMethodBody)
-> Data SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
SubmitSelfServiceRegistrationFlowWithPasswordMethodBody -> DataType
SubmitSelfServiceRegistrationFlowWithPasswordMethodBody -> Constr
(forall b. Data b => b -> b)
-> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
-> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
-> c SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
forall a.
Typeable a
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g) -> a -> c a)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r) -> Constr -> c a)
-> (a -> Constr)
-> (a -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d)) -> Maybe (c a))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c a))
-> ((forall b. Data b => b -> b) -> a -> a)
-> (forall r r'.
    (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall r r'.
    (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall u. (forall d. Data d => d -> u) -> a -> [u])
-> (forall u. Int -> (forall d. Data d => d -> u) -> a -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> Data a
forall u.
Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
-> u
forall u.
(forall d. Data d => d -> u)
-> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody -> [u]
forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
-> r
forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
-> r
forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
-> m SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
-> m SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
-> c SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe
     (c SubmitSelfServiceRegistrationFlowWithPasswordMethodBody)
forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe
     (c SubmitSelfServiceRegistrationFlowWithPasswordMethodBody)
$cSubmitSelfServiceRegistrationFlowWithPasswordMethodBody :: Constr
$tSubmitSelfServiceRegistrationFlowWithPasswordMethodBody :: DataType
gmapMo :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
-> m SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
$cgmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
-> m SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
gmapMp :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
-> m SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
$cgmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
-> m SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
gmapM :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
-> m SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
$cgmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
-> m SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
gmapQi :: Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
-> u
$cgmapQi :: forall u.
Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
-> u
gmapQ :: (forall d. Data d => d -> u)
-> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody -> [u]
$cgmapQ :: forall u.
(forall d. Data d => d -> u)
-> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody -> [u]
gmapQr :: (r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
-> r
$cgmapQr :: forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
-> r
gmapQl :: (r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
-> r
$cgmapQl :: forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
-> r
gmapT :: (forall b. Data b => b -> b)
-> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
-> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
$cgmapT :: (forall b. Data b => b -> b)
-> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
-> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
dataCast2 :: (forall d e. (Data d, Data e) => c (t d e))
-> Maybe
     (c SubmitSelfServiceRegistrationFlowWithPasswordMethodBody)
$cdataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe
     (c SubmitSelfServiceRegistrationFlowWithPasswordMethodBody)
dataCast1 :: (forall d. Data d => c (t d))
-> Maybe
     (c SubmitSelfServiceRegistrationFlowWithPasswordMethodBody)
$cdataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe
     (c SubmitSelfServiceRegistrationFlowWithPasswordMethodBody)
dataTypeOf :: SubmitSelfServiceRegistrationFlowWithPasswordMethodBody -> DataType
$cdataTypeOf :: SubmitSelfServiceRegistrationFlowWithPasswordMethodBody -> DataType
toConstr :: SubmitSelfServiceRegistrationFlowWithPasswordMethodBody -> Constr
$ctoConstr :: SubmitSelfServiceRegistrationFlowWithPasswordMethodBody -> Constr
gunfold :: (forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
$cgunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
-> c SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
$cgfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
-> c SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
$cp1Data :: Typeable SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
Data)

instance FromJSON SubmitSelfServiceRegistrationFlowWithPasswordMethodBody

instance ToJSON SubmitSelfServiceRegistrationFlowWithPasswordMethodBody where
  toEncoding :: SubmitSelfServiceRegistrationFlowWithPasswordMethodBody -> Encoding
toEncoding = Options
-> SubmitSelfServiceRegistrationFlowWithPasswordMethodBody
-> Encoding
forall a.
(Generic a, GToJSON' Encoding Zero (Rep a)) =>
Options -> a -> Encoding
genericToEncoding Options
defaultOptions

data SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody = SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
  { -- | CSRFToken is the anti-CSRF token
    SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
-> Maybe Text
csrf_token :: Maybe Text,
    -- | Method  Should be set to \"webauthn\" when trying to add, update, or remove a webAuthn pairing.
    SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody -> Text
method :: Text,
    -- | The identity's traits
    SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody -> Value
traits :: Value,
    -- | Register a WebAuthn Security Key  It is expected that the JSON returned by the WebAuthn registration process is included here.
    SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
-> Maybe Text
webauthn_register :: Maybe Text,
    -- | Name of the WebAuthn Security Key to be Added  A human-readable name for the security key which will be added.
    SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
-> Maybe Text
webauthn_register_displayname :: Maybe Text
  }
  deriving stock (Int
-> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody -> ShowS
[SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody] -> ShowS
SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody -> String
(Int
 -> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
 -> ShowS)
-> (SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
    -> String)
-> ([SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody]
    -> ShowS)
-> Show SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody] -> ShowS
$cshowList :: [SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody] -> ShowS
show :: SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody -> String
$cshow :: SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody -> String
showsPrec :: Int
-> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody -> ShowS
$cshowsPrec :: Int
-> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody -> ShowS
Show, SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
-> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody -> Bool
(SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
 -> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody -> Bool)
-> (SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
    -> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody -> Bool)
-> Eq SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
-> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody -> Bool
$c/= :: SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
-> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody -> Bool
== :: SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
-> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody -> Bool
$c== :: SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
-> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody -> Bool
Eq, (forall x.
 SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
 -> Rep SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody x)
-> (forall x.
    Rep SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody x
    -> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody)
-> Generic SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
forall x.
Rep SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody x
-> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
forall x.
SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
-> Rep SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody x
-> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
$cfrom :: forall x.
SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
-> Rep SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody x
Generic, Typeable SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
DataType
Constr
Typeable SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g)
    -> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
    -> c SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r)
    -> Constr
    -> c SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody)
-> (SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
    -> Constr)
-> (SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
    -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d))
    -> Maybe
         (c SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e))
    -> Maybe
         (c SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody))
-> ((forall b. Data b => b -> b)
    -> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
    -> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody)
-> (forall r r'.
    (r -> r' -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
    -> r)
-> (forall r r'.
    (r' -> r -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
    -> r)
-> (forall u.
    (forall d. Data d => d -> u)
    -> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody -> [u])
-> (forall u.
    Int
    -> (forall d. Data d => d -> u)
    -> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
    -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
    -> m SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
    -> m SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
    -> m SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody)
-> Data SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody -> DataType
SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody -> Constr
(forall b. Data b => b -> b)
-> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
-> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
-> c SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
forall a.
Typeable a
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g) -> a -> c a)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r) -> Constr -> c a)
-> (a -> Constr)
-> (a -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d)) -> Maybe (c a))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c a))
-> ((forall b. Data b => b -> b) -> a -> a)
-> (forall r r'.
    (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall r r'.
    (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall u. (forall d. Data d => d -> u) -> a -> [u])
-> (forall u. Int -> (forall d. Data d => d -> u) -> a -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> Data a
forall u.
Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
-> u
forall u.
(forall d. Data d => d -> u)
-> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody -> [u]
forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
-> r
forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
-> r
forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
-> m SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
-> m SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
-> c SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe
     (c SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody)
forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe
     (c SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody)
$cSubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody :: Constr
$tSubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody :: DataType
gmapMo :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
-> m SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
$cgmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
-> m SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
gmapMp :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
-> m SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
$cgmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
-> m SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
gmapM :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
-> m SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
$cgmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
-> m SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
gmapQi :: Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
-> u
$cgmapQi :: forall u.
Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
-> u
gmapQ :: (forall d. Data d => d -> u)
-> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody -> [u]
$cgmapQ :: forall u.
(forall d. Data d => d -> u)
-> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody -> [u]
gmapQr :: (r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
-> r
$cgmapQr :: forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
-> r
gmapQl :: (r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
-> r
$cgmapQl :: forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
-> r
gmapT :: (forall b. Data b => b -> b)
-> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
-> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
$cgmapT :: (forall b. Data b => b -> b)
-> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
-> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
dataCast2 :: (forall d e. (Data d, Data e) => c (t d e))
-> Maybe
     (c SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody)
$cdataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe
     (c SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody)
dataCast1 :: (forall d. Data d => c (t d))
-> Maybe
     (c SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody)
$cdataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe
     (c SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody)
dataTypeOf :: SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody -> DataType
$cdataTypeOf :: SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody -> DataType
toConstr :: SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody -> Constr
$ctoConstr :: SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody -> Constr
gunfold :: (forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
$cgunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
-> c SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
$cgfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
-> c SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
$cp1Data :: Typeable SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
Data)

instance FromJSON SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody

instance ToJSON SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody where
  toEncoding :: SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody -> Encoding
toEncoding = Options
-> SubmitSelfServiceRegistrationFlowWithWebAuthnMethodBody
-> Encoding
forall a.
(Generic a, GToJSON' Encoding Zero (Rep a)) =>
Options -> a -> Encoding
genericToEncoding Options
defaultOptions

data SubmitSelfServiceSettingsFlowBody = SubmitSelfServiceSettingsFlowBody
  { -- | CSRFToken is the anti-CSRF token
    SubmitSelfServiceSettingsFlowBody -> Maybe Text
csrf_token :: Maybe Text,
    -- | Method  Should be set to \"lookup\" when trying to add, update, or remove a lookup pairing.
    SubmitSelfServiceSettingsFlowBody -> Text
method :: Text,
    -- | Password is the updated password
    SubmitSelfServiceSettingsFlowBody -> Text
password :: Text,
    -- | The identity's traits  in: body
    SubmitSelfServiceSettingsFlowBody -> Value
traits :: Value,
    -- | Flow ID is the flow's ID.  in: query
    SubmitSelfServiceSettingsFlowBody -> Maybe Text
flow :: Maybe Text,
    -- | Link this provider  Either this or `unlink` must be set.  type: string in: body
    SubmitSelfServiceSettingsFlowBody -> Maybe Text
link :: Maybe Text,
    -- | Unlink this provider  Either this or `link` must be set.  type: string in: body
    SubmitSelfServiceSettingsFlowBody -> Maybe Text
unlink :: Maybe Text,
    -- | ValidationTOTP must contain a valid TOTP based on the
    SubmitSelfServiceSettingsFlowBody -> Maybe Text
totp_code :: Maybe Text,
    -- | UnlinkTOTP if true will remove the TOTP pairing, effectively removing the credential. This can be used to set up a new TOTP device.
    SubmitSelfServiceSettingsFlowBody -> Maybe Bool
totp_unlink :: Maybe Bool,
    -- | Register a WebAuthn Security Key  It is expected that the JSON returned by the WebAuthn registration process is included here.
    SubmitSelfServiceSettingsFlowBody -> Maybe Text
webauthn_register :: Maybe Text,
    -- | Name of the WebAuthn Security Key to be Added  A human-readable name for the security key which will be added.
    SubmitSelfServiceSettingsFlowBody -> Maybe Text
webauthn_register_displayname :: Maybe Text,
    -- | Remove a WebAuthn Security Key  This must contain the ID of the WebAuthN connection.
    SubmitSelfServiceSettingsFlowBody -> Maybe Text
webauthn_remove :: Maybe Text,
    -- | If set to true will save the regenerated lookup secrets
    SubmitSelfServiceSettingsFlowBody -> Maybe Bool
lookup_secret_confirm :: Maybe Bool,
    -- | Disables this method if true.
    SubmitSelfServiceSettingsFlowBody -> Maybe Bool
lookup_secret_disable :: Maybe Bool,
    -- | If set to true will regenerate the lookup secrets
    SubmitSelfServiceSettingsFlowBody -> Maybe Bool
lookup_secret_regenerate :: Maybe Bool,
    -- | If set to true will reveal the lookup secrets
    SubmitSelfServiceSettingsFlowBody -> Maybe Bool
lookup_secret_reveal :: Maybe Bool
  }
  deriving stock (Int -> SubmitSelfServiceSettingsFlowBody -> ShowS
[SubmitSelfServiceSettingsFlowBody] -> ShowS
SubmitSelfServiceSettingsFlowBody -> String
(Int -> SubmitSelfServiceSettingsFlowBody -> ShowS)
-> (SubmitSelfServiceSettingsFlowBody -> String)
-> ([SubmitSelfServiceSettingsFlowBody] -> ShowS)
-> Show SubmitSelfServiceSettingsFlowBody
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [SubmitSelfServiceSettingsFlowBody] -> ShowS
$cshowList :: [SubmitSelfServiceSettingsFlowBody] -> ShowS
show :: SubmitSelfServiceSettingsFlowBody -> String
$cshow :: SubmitSelfServiceSettingsFlowBody -> String
showsPrec :: Int -> SubmitSelfServiceSettingsFlowBody -> ShowS
$cshowsPrec :: Int -> SubmitSelfServiceSettingsFlowBody -> ShowS
Show, SubmitSelfServiceSettingsFlowBody
-> SubmitSelfServiceSettingsFlowBody -> Bool
(SubmitSelfServiceSettingsFlowBody
 -> SubmitSelfServiceSettingsFlowBody -> Bool)
-> (SubmitSelfServiceSettingsFlowBody
    -> SubmitSelfServiceSettingsFlowBody -> Bool)
-> Eq SubmitSelfServiceSettingsFlowBody
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: SubmitSelfServiceSettingsFlowBody
-> SubmitSelfServiceSettingsFlowBody -> Bool
$c/= :: SubmitSelfServiceSettingsFlowBody
-> SubmitSelfServiceSettingsFlowBody -> Bool
== :: SubmitSelfServiceSettingsFlowBody
-> SubmitSelfServiceSettingsFlowBody -> Bool
$c== :: SubmitSelfServiceSettingsFlowBody
-> SubmitSelfServiceSettingsFlowBody -> Bool
Eq, (forall x.
 SubmitSelfServiceSettingsFlowBody
 -> Rep SubmitSelfServiceSettingsFlowBody x)
-> (forall x.
    Rep SubmitSelfServiceSettingsFlowBody x
    -> SubmitSelfServiceSettingsFlowBody)
-> Generic SubmitSelfServiceSettingsFlowBody
forall x.
Rep SubmitSelfServiceSettingsFlowBody x
-> SubmitSelfServiceSettingsFlowBody
forall x.
SubmitSelfServiceSettingsFlowBody
-> Rep SubmitSelfServiceSettingsFlowBody x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep SubmitSelfServiceSettingsFlowBody x
-> SubmitSelfServiceSettingsFlowBody
$cfrom :: forall x.
SubmitSelfServiceSettingsFlowBody
-> Rep SubmitSelfServiceSettingsFlowBody x
Generic, Typeable SubmitSelfServiceSettingsFlowBody
DataType
Constr
Typeable SubmitSelfServiceSettingsFlowBody
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g)
    -> SubmitSelfServiceSettingsFlowBody
    -> c SubmitSelfServiceSettingsFlowBody)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r)
    -> Constr
    -> c SubmitSelfServiceSettingsFlowBody)
-> (SubmitSelfServiceSettingsFlowBody -> Constr)
-> (SubmitSelfServiceSettingsFlowBody -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d))
    -> Maybe (c SubmitSelfServiceSettingsFlowBody))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e))
    -> Maybe (c SubmitSelfServiceSettingsFlowBody))
-> ((forall b. Data b => b -> b)
    -> SubmitSelfServiceSettingsFlowBody
    -> SubmitSelfServiceSettingsFlowBody)
-> (forall r r'.
    (r -> r' -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SubmitSelfServiceSettingsFlowBody
    -> r)
-> (forall r r'.
    (r' -> r -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SubmitSelfServiceSettingsFlowBody
    -> r)
-> (forall u.
    (forall d. Data d => d -> u)
    -> SubmitSelfServiceSettingsFlowBody -> [u])
-> (forall u.
    Int
    -> (forall d. Data d => d -> u)
    -> SubmitSelfServiceSettingsFlowBody
    -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceSettingsFlowBody
    -> m SubmitSelfServiceSettingsFlowBody)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceSettingsFlowBody
    -> m SubmitSelfServiceSettingsFlowBody)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceSettingsFlowBody
    -> m SubmitSelfServiceSettingsFlowBody)
-> Data SubmitSelfServiceSettingsFlowBody
SubmitSelfServiceSettingsFlowBody -> DataType
SubmitSelfServiceSettingsFlowBody -> Constr
(forall b. Data b => b -> b)
-> SubmitSelfServiceSettingsFlowBody
-> SubmitSelfServiceSettingsFlowBody
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceSettingsFlowBody
-> c SubmitSelfServiceSettingsFlowBody
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceSettingsFlowBody
forall a.
Typeable a
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g) -> a -> c a)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r) -> Constr -> c a)
-> (a -> Constr)
-> (a -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d)) -> Maybe (c a))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c a))
-> ((forall b. Data b => b -> b) -> a -> a)
-> (forall r r'.
    (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall r r'.
    (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall u. (forall d. Data d => d -> u) -> a -> [u])
-> (forall u. Int -> (forall d. Data d => d -> u) -> a -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> Data a
forall u.
Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceSettingsFlowBody
-> u
forall u.
(forall d. Data d => d -> u)
-> SubmitSelfServiceSettingsFlowBody -> [u]
forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceSettingsFlowBody
-> r
forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceSettingsFlowBody
-> r
forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowBody
-> m SubmitSelfServiceSettingsFlowBody
forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowBody
-> m SubmitSelfServiceSettingsFlowBody
forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceSettingsFlowBody
forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceSettingsFlowBody
-> c SubmitSelfServiceSettingsFlowBody
forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceSettingsFlowBody)
forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceSettingsFlowBody)
$cSubmitSelfServiceSettingsFlowBody :: Constr
$tSubmitSelfServiceSettingsFlowBody :: DataType
gmapMo :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowBody
-> m SubmitSelfServiceSettingsFlowBody
$cgmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowBody
-> m SubmitSelfServiceSettingsFlowBody
gmapMp :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowBody
-> m SubmitSelfServiceSettingsFlowBody
$cgmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowBody
-> m SubmitSelfServiceSettingsFlowBody
gmapM :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowBody
-> m SubmitSelfServiceSettingsFlowBody
$cgmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowBody
-> m SubmitSelfServiceSettingsFlowBody
gmapQi :: Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceSettingsFlowBody
-> u
$cgmapQi :: forall u.
Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceSettingsFlowBody
-> u
gmapQ :: (forall d. Data d => d -> u)
-> SubmitSelfServiceSettingsFlowBody -> [u]
$cgmapQ :: forall u.
(forall d. Data d => d -> u)
-> SubmitSelfServiceSettingsFlowBody -> [u]
gmapQr :: (r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceSettingsFlowBody
-> r
$cgmapQr :: forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceSettingsFlowBody
-> r
gmapQl :: (r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceSettingsFlowBody
-> r
$cgmapQl :: forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceSettingsFlowBody
-> r
gmapT :: (forall b. Data b => b -> b)
-> SubmitSelfServiceSettingsFlowBody
-> SubmitSelfServiceSettingsFlowBody
$cgmapT :: (forall b. Data b => b -> b)
-> SubmitSelfServiceSettingsFlowBody
-> SubmitSelfServiceSettingsFlowBody
dataCast2 :: (forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceSettingsFlowBody)
$cdataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceSettingsFlowBody)
dataCast1 :: (forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceSettingsFlowBody)
$cdataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceSettingsFlowBody)
dataTypeOf :: SubmitSelfServiceSettingsFlowBody -> DataType
$cdataTypeOf :: SubmitSelfServiceSettingsFlowBody -> DataType
toConstr :: SubmitSelfServiceSettingsFlowBody -> Constr
$ctoConstr :: SubmitSelfServiceSettingsFlowBody -> Constr
gunfold :: (forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceSettingsFlowBody
$cgunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceSettingsFlowBody
gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceSettingsFlowBody
-> c SubmitSelfServiceSettingsFlowBody
$cgfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceSettingsFlowBody
-> c SubmitSelfServiceSettingsFlowBody
$cp1Data :: Typeable SubmitSelfServiceSettingsFlowBody
Data)

instance FromJSON SubmitSelfServiceSettingsFlowBody

instance ToJSON SubmitSelfServiceSettingsFlowBody where
  toEncoding :: SubmitSelfServiceSettingsFlowBody -> Encoding
toEncoding = Options -> SubmitSelfServiceSettingsFlowBody -> Encoding
forall a.
(Generic a, GToJSON' Encoding Zero (Rep a)) =>
Options -> a -> Encoding
genericToEncoding Options
defaultOptions

data SubmitSelfServiceSettingsFlowWithLookupMethodBody = SubmitSelfServiceSettingsFlowWithLookupMethodBody
  { -- | CSRFToken is the anti-CSRF token
    SubmitSelfServiceSettingsFlowWithLookupMethodBody -> Maybe Text
csrf_token :: Maybe Text,
    -- | If set to true will save the regenerated lookup secrets
    SubmitSelfServiceSettingsFlowWithLookupMethodBody -> Maybe Bool
lookup_secret_confirm :: Maybe Bool,
    -- | Disables this method if true.
    SubmitSelfServiceSettingsFlowWithLookupMethodBody -> Maybe Bool
lookup_secret_disable :: Maybe Bool,
    -- | If set to true will regenerate the lookup secrets
    SubmitSelfServiceSettingsFlowWithLookupMethodBody -> Maybe Bool
lookup_secret_regenerate :: Maybe Bool,
    -- | If set to true will reveal the lookup secrets
    SubmitSelfServiceSettingsFlowWithLookupMethodBody -> Maybe Bool
lookup_secret_reveal :: Maybe Bool,
    -- | Method  Should be set to \"lookup\" when trying to add, update, or remove a lookup pairing.
    SubmitSelfServiceSettingsFlowWithLookupMethodBody -> Text
method :: Text
  }
  deriving stock (Int -> SubmitSelfServiceSettingsFlowWithLookupMethodBody -> ShowS
[SubmitSelfServiceSettingsFlowWithLookupMethodBody] -> ShowS
SubmitSelfServiceSettingsFlowWithLookupMethodBody -> String
(Int -> SubmitSelfServiceSettingsFlowWithLookupMethodBody -> ShowS)
-> (SubmitSelfServiceSettingsFlowWithLookupMethodBody -> String)
-> ([SubmitSelfServiceSettingsFlowWithLookupMethodBody] -> ShowS)
-> Show SubmitSelfServiceSettingsFlowWithLookupMethodBody
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [SubmitSelfServiceSettingsFlowWithLookupMethodBody] -> ShowS
$cshowList :: [SubmitSelfServiceSettingsFlowWithLookupMethodBody] -> ShowS
show :: SubmitSelfServiceSettingsFlowWithLookupMethodBody -> String
$cshow :: SubmitSelfServiceSettingsFlowWithLookupMethodBody -> String
showsPrec :: Int -> SubmitSelfServiceSettingsFlowWithLookupMethodBody -> ShowS
$cshowsPrec :: Int -> SubmitSelfServiceSettingsFlowWithLookupMethodBody -> ShowS
Show, SubmitSelfServiceSettingsFlowWithLookupMethodBody
-> SubmitSelfServiceSettingsFlowWithLookupMethodBody -> Bool
(SubmitSelfServiceSettingsFlowWithLookupMethodBody
 -> SubmitSelfServiceSettingsFlowWithLookupMethodBody -> Bool)
-> (SubmitSelfServiceSettingsFlowWithLookupMethodBody
    -> SubmitSelfServiceSettingsFlowWithLookupMethodBody -> Bool)
-> Eq SubmitSelfServiceSettingsFlowWithLookupMethodBody
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: SubmitSelfServiceSettingsFlowWithLookupMethodBody
-> SubmitSelfServiceSettingsFlowWithLookupMethodBody -> Bool
$c/= :: SubmitSelfServiceSettingsFlowWithLookupMethodBody
-> SubmitSelfServiceSettingsFlowWithLookupMethodBody -> Bool
== :: SubmitSelfServiceSettingsFlowWithLookupMethodBody
-> SubmitSelfServiceSettingsFlowWithLookupMethodBody -> Bool
$c== :: SubmitSelfServiceSettingsFlowWithLookupMethodBody
-> SubmitSelfServiceSettingsFlowWithLookupMethodBody -> Bool
Eq, (forall x.
 SubmitSelfServiceSettingsFlowWithLookupMethodBody
 -> Rep SubmitSelfServiceSettingsFlowWithLookupMethodBody x)
-> (forall x.
    Rep SubmitSelfServiceSettingsFlowWithLookupMethodBody x
    -> SubmitSelfServiceSettingsFlowWithLookupMethodBody)
-> Generic SubmitSelfServiceSettingsFlowWithLookupMethodBody
forall x.
Rep SubmitSelfServiceSettingsFlowWithLookupMethodBody x
-> SubmitSelfServiceSettingsFlowWithLookupMethodBody
forall x.
SubmitSelfServiceSettingsFlowWithLookupMethodBody
-> Rep SubmitSelfServiceSettingsFlowWithLookupMethodBody x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep SubmitSelfServiceSettingsFlowWithLookupMethodBody x
-> SubmitSelfServiceSettingsFlowWithLookupMethodBody
$cfrom :: forall x.
SubmitSelfServiceSettingsFlowWithLookupMethodBody
-> Rep SubmitSelfServiceSettingsFlowWithLookupMethodBody x
Generic, Typeable SubmitSelfServiceSettingsFlowWithLookupMethodBody
DataType
Constr
Typeable SubmitSelfServiceSettingsFlowWithLookupMethodBody
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g)
    -> SubmitSelfServiceSettingsFlowWithLookupMethodBody
    -> c SubmitSelfServiceSettingsFlowWithLookupMethodBody)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r)
    -> Constr
    -> c SubmitSelfServiceSettingsFlowWithLookupMethodBody)
-> (SubmitSelfServiceSettingsFlowWithLookupMethodBody -> Constr)
-> (SubmitSelfServiceSettingsFlowWithLookupMethodBody -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d))
    -> Maybe (c SubmitSelfServiceSettingsFlowWithLookupMethodBody))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e))
    -> Maybe (c SubmitSelfServiceSettingsFlowWithLookupMethodBody))
-> ((forall b. Data b => b -> b)
    -> SubmitSelfServiceSettingsFlowWithLookupMethodBody
    -> SubmitSelfServiceSettingsFlowWithLookupMethodBody)
-> (forall r r'.
    (r -> r' -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SubmitSelfServiceSettingsFlowWithLookupMethodBody
    -> r)
-> (forall r r'.
    (r' -> r -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SubmitSelfServiceSettingsFlowWithLookupMethodBody
    -> r)
-> (forall u.
    (forall d. Data d => d -> u)
    -> SubmitSelfServiceSettingsFlowWithLookupMethodBody -> [u])
-> (forall u.
    Int
    -> (forall d. Data d => d -> u)
    -> SubmitSelfServiceSettingsFlowWithLookupMethodBody
    -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceSettingsFlowWithLookupMethodBody
    -> m SubmitSelfServiceSettingsFlowWithLookupMethodBody)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceSettingsFlowWithLookupMethodBody
    -> m SubmitSelfServiceSettingsFlowWithLookupMethodBody)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceSettingsFlowWithLookupMethodBody
    -> m SubmitSelfServiceSettingsFlowWithLookupMethodBody)
-> Data SubmitSelfServiceSettingsFlowWithLookupMethodBody
SubmitSelfServiceSettingsFlowWithLookupMethodBody -> DataType
SubmitSelfServiceSettingsFlowWithLookupMethodBody -> Constr
(forall b. Data b => b -> b)
-> SubmitSelfServiceSettingsFlowWithLookupMethodBody
-> SubmitSelfServiceSettingsFlowWithLookupMethodBody
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceSettingsFlowWithLookupMethodBody
-> c SubmitSelfServiceSettingsFlowWithLookupMethodBody
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceSettingsFlowWithLookupMethodBody
forall a.
Typeable a
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g) -> a -> c a)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r) -> Constr -> c a)
-> (a -> Constr)
-> (a -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d)) -> Maybe (c a))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c a))
-> ((forall b. Data b => b -> b) -> a -> a)
-> (forall r r'.
    (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall r r'.
    (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall u. (forall d. Data d => d -> u) -> a -> [u])
-> (forall u. Int -> (forall d. Data d => d -> u) -> a -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> Data a
forall u.
Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceSettingsFlowWithLookupMethodBody
-> u
forall u.
(forall d. Data d => d -> u)
-> SubmitSelfServiceSettingsFlowWithLookupMethodBody -> [u]
forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceSettingsFlowWithLookupMethodBody
-> r
forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceSettingsFlowWithLookupMethodBody
-> r
forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithLookupMethodBody
-> m SubmitSelfServiceSettingsFlowWithLookupMethodBody
forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithLookupMethodBody
-> m SubmitSelfServiceSettingsFlowWithLookupMethodBody
forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceSettingsFlowWithLookupMethodBody
forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceSettingsFlowWithLookupMethodBody
-> c SubmitSelfServiceSettingsFlowWithLookupMethodBody
forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceSettingsFlowWithLookupMethodBody)
forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceSettingsFlowWithLookupMethodBody)
$cSubmitSelfServiceSettingsFlowWithLookupMethodBody :: Constr
$tSubmitSelfServiceSettingsFlowWithLookupMethodBody :: DataType
gmapMo :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithLookupMethodBody
-> m SubmitSelfServiceSettingsFlowWithLookupMethodBody
$cgmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithLookupMethodBody
-> m SubmitSelfServiceSettingsFlowWithLookupMethodBody
gmapMp :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithLookupMethodBody
-> m SubmitSelfServiceSettingsFlowWithLookupMethodBody
$cgmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithLookupMethodBody
-> m SubmitSelfServiceSettingsFlowWithLookupMethodBody
gmapM :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithLookupMethodBody
-> m SubmitSelfServiceSettingsFlowWithLookupMethodBody
$cgmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithLookupMethodBody
-> m SubmitSelfServiceSettingsFlowWithLookupMethodBody
gmapQi :: Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceSettingsFlowWithLookupMethodBody
-> u
$cgmapQi :: forall u.
Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceSettingsFlowWithLookupMethodBody
-> u
gmapQ :: (forall d. Data d => d -> u)
-> SubmitSelfServiceSettingsFlowWithLookupMethodBody -> [u]
$cgmapQ :: forall u.
(forall d. Data d => d -> u)
-> SubmitSelfServiceSettingsFlowWithLookupMethodBody -> [u]
gmapQr :: (r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceSettingsFlowWithLookupMethodBody
-> r
$cgmapQr :: forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceSettingsFlowWithLookupMethodBody
-> r
gmapQl :: (r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceSettingsFlowWithLookupMethodBody
-> r
$cgmapQl :: forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceSettingsFlowWithLookupMethodBody
-> r
gmapT :: (forall b. Data b => b -> b)
-> SubmitSelfServiceSettingsFlowWithLookupMethodBody
-> SubmitSelfServiceSettingsFlowWithLookupMethodBody
$cgmapT :: (forall b. Data b => b -> b)
-> SubmitSelfServiceSettingsFlowWithLookupMethodBody
-> SubmitSelfServiceSettingsFlowWithLookupMethodBody
dataCast2 :: (forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceSettingsFlowWithLookupMethodBody)
$cdataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceSettingsFlowWithLookupMethodBody)
dataCast1 :: (forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceSettingsFlowWithLookupMethodBody)
$cdataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceSettingsFlowWithLookupMethodBody)
dataTypeOf :: SubmitSelfServiceSettingsFlowWithLookupMethodBody -> DataType
$cdataTypeOf :: SubmitSelfServiceSettingsFlowWithLookupMethodBody -> DataType
toConstr :: SubmitSelfServiceSettingsFlowWithLookupMethodBody -> Constr
$ctoConstr :: SubmitSelfServiceSettingsFlowWithLookupMethodBody -> Constr
gunfold :: (forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceSettingsFlowWithLookupMethodBody
$cgunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceSettingsFlowWithLookupMethodBody
gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceSettingsFlowWithLookupMethodBody
-> c SubmitSelfServiceSettingsFlowWithLookupMethodBody
$cgfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceSettingsFlowWithLookupMethodBody
-> c SubmitSelfServiceSettingsFlowWithLookupMethodBody
$cp1Data :: Typeable SubmitSelfServiceSettingsFlowWithLookupMethodBody
Data)

instance FromJSON SubmitSelfServiceSettingsFlowWithLookupMethodBody

instance ToJSON SubmitSelfServiceSettingsFlowWithLookupMethodBody where
  toEncoding :: SubmitSelfServiceSettingsFlowWithLookupMethodBody -> Encoding
toEncoding = Options
-> SubmitSelfServiceSettingsFlowWithLookupMethodBody -> Encoding
forall a.
(Generic a, GToJSON' Encoding Zero (Rep a)) =>
Options -> a -> Encoding
genericToEncoding Options
defaultOptions

-- | nolint:deadcode,unused
data SubmitSelfServiceSettingsFlowWithOidcMethodBody = SubmitSelfServiceSettingsFlowWithOidcMethodBody
  { -- | Flow ID is the flow's ID.  in: query
    SubmitSelfServiceSettingsFlowWithOidcMethodBody -> Maybe Text
flow :: Maybe Text,
    -- | Link this provider  Either this or `unlink` must be set.  type: string in: body
    SubmitSelfServiceSettingsFlowWithOidcMethodBody -> Maybe Text
link :: Maybe Text,
    -- | Method  Should be set to profile when trying to update a profile.
    SubmitSelfServiceSettingsFlowWithOidcMethodBody -> Text
method :: Text,
    -- | The identity's traits  in: body
    SubmitSelfServiceSettingsFlowWithOidcMethodBody -> Maybe Value
traits :: Maybe Value,
    -- | Unlink this provider  Either this or `link` must be set.  type: string in: body
    SubmitSelfServiceSettingsFlowWithOidcMethodBody -> Maybe Text
unlink :: Maybe Text
  }
  deriving stock (Int -> SubmitSelfServiceSettingsFlowWithOidcMethodBody -> ShowS
[SubmitSelfServiceSettingsFlowWithOidcMethodBody] -> ShowS
SubmitSelfServiceSettingsFlowWithOidcMethodBody -> String
(Int -> SubmitSelfServiceSettingsFlowWithOidcMethodBody -> ShowS)
-> (SubmitSelfServiceSettingsFlowWithOidcMethodBody -> String)
-> ([SubmitSelfServiceSettingsFlowWithOidcMethodBody] -> ShowS)
-> Show SubmitSelfServiceSettingsFlowWithOidcMethodBody
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [SubmitSelfServiceSettingsFlowWithOidcMethodBody] -> ShowS
$cshowList :: [SubmitSelfServiceSettingsFlowWithOidcMethodBody] -> ShowS
show :: SubmitSelfServiceSettingsFlowWithOidcMethodBody -> String
$cshow :: SubmitSelfServiceSettingsFlowWithOidcMethodBody -> String
showsPrec :: Int -> SubmitSelfServiceSettingsFlowWithOidcMethodBody -> ShowS
$cshowsPrec :: Int -> SubmitSelfServiceSettingsFlowWithOidcMethodBody -> ShowS
Show, SubmitSelfServiceSettingsFlowWithOidcMethodBody
-> SubmitSelfServiceSettingsFlowWithOidcMethodBody -> Bool
(SubmitSelfServiceSettingsFlowWithOidcMethodBody
 -> SubmitSelfServiceSettingsFlowWithOidcMethodBody -> Bool)
-> (SubmitSelfServiceSettingsFlowWithOidcMethodBody
    -> SubmitSelfServiceSettingsFlowWithOidcMethodBody -> Bool)
-> Eq SubmitSelfServiceSettingsFlowWithOidcMethodBody
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: SubmitSelfServiceSettingsFlowWithOidcMethodBody
-> SubmitSelfServiceSettingsFlowWithOidcMethodBody -> Bool
$c/= :: SubmitSelfServiceSettingsFlowWithOidcMethodBody
-> SubmitSelfServiceSettingsFlowWithOidcMethodBody -> Bool
== :: SubmitSelfServiceSettingsFlowWithOidcMethodBody
-> SubmitSelfServiceSettingsFlowWithOidcMethodBody -> Bool
$c== :: SubmitSelfServiceSettingsFlowWithOidcMethodBody
-> SubmitSelfServiceSettingsFlowWithOidcMethodBody -> Bool
Eq, (forall x.
 SubmitSelfServiceSettingsFlowWithOidcMethodBody
 -> Rep SubmitSelfServiceSettingsFlowWithOidcMethodBody x)
-> (forall x.
    Rep SubmitSelfServiceSettingsFlowWithOidcMethodBody x
    -> SubmitSelfServiceSettingsFlowWithOidcMethodBody)
-> Generic SubmitSelfServiceSettingsFlowWithOidcMethodBody
forall x.
Rep SubmitSelfServiceSettingsFlowWithOidcMethodBody x
-> SubmitSelfServiceSettingsFlowWithOidcMethodBody
forall x.
SubmitSelfServiceSettingsFlowWithOidcMethodBody
-> Rep SubmitSelfServiceSettingsFlowWithOidcMethodBody x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep SubmitSelfServiceSettingsFlowWithOidcMethodBody x
-> SubmitSelfServiceSettingsFlowWithOidcMethodBody
$cfrom :: forall x.
SubmitSelfServiceSettingsFlowWithOidcMethodBody
-> Rep SubmitSelfServiceSettingsFlowWithOidcMethodBody x
Generic, Typeable SubmitSelfServiceSettingsFlowWithOidcMethodBody
DataType
Constr
Typeable SubmitSelfServiceSettingsFlowWithOidcMethodBody
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g)
    -> SubmitSelfServiceSettingsFlowWithOidcMethodBody
    -> c SubmitSelfServiceSettingsFlowWithOidcMethodBody)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r)
    -> Constr
    -> c SubmitSelfServiceSettingsFlowWithOidcMethodBody)
-> (SubmitSelfServiceSettingsFlowWithOidcMethodBody -> Constr)
-> (SubmitSelfServiceSettingsFlowWithOidcMethodBody -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d))
    -> Maybe (c SubmitSelfServiceSettingsFlowWithOidcMethodBody))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e))
    -> Maybe (c SubmitSelfServiceSettingsFlowWithOidcMethodBody))
-> ((forall b. Data b => b -> b)
    -> SubmitSelfServiceSettingsFlowWithOidcMethodBody
    -> SubmitSelfServiceSettingsFlowWithOidcMethodBody)
-> (forall r r'.
    (r -> r' -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SubmitSelfServiceSettingsFlowWithOidcMethodBody
    -> r)
-> (forall r r'.
    (r' -> r -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SubmitSelfServiceSettingsFlowWithOidcMethodBody
    -> r)
-> (forall u.
    (forall d. Data d => d -> u)
    -> SubmitSelfServiceSettingsFlowWithOidcMethodBody -> [u])
-> (forall u.
    Int
    -> (forall d. Data d => d -> u)
    -> SubmitSelfServiceSettingsFlowWithOidcMethodBody
    -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceSettingsFlowWithOidcMethodBody
    -> m SubmitSelfServiceSettingsFlowWithOidcMethodBody)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceSettingsFlowWithOidcMethodBody
    -> m SubmitSelfServiceSettingsFlowWithOidcMethodBody)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceSettingsFlowWithOidcMethodBody
    -> m SubmitSelfServiceSettingsFlowWithOidcMethodBody)
-> Data SubmitSelfServiceSettingsFlowWithOidcMethodBody
SubmitSelfServiceSettingsFlowWithOidcMethodBody -> DataType
SubmitSelfServiceSettingsFlowWithOidcMethodBody -> Constr
(forall b. Data b => b -> b)
-> SubmitSelfServiceSettingsFlowWithOidcMethodBody
-> SubmitSelfServiceSettingsFlowWithOidcMethodBody
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceSettingsFlowWithOidcMethodBody
-> c SubmitSelfServiceSettingsFlowWithOidcMethodBody
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceSettingsFlowWithOidcMethodBody
forall a.
Typeable a
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g) -> a -> c a)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r) -> Constr -> c a)
-> (a -> Constr)
-> (a -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d)) -> Maybe (c a))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c a))
-> ((forall b. Data b => b -> b) -> a -> a)
-> (forall r r'.
    (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall r r'.
    (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall u. (forall d. Data d => d -> u) -> a -> [u])
-> (forall u. Int -> (forall d. Data d => d -> u) -> a -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> Data a
forall u.
Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceSettingsFlowWithOidcMethodBody
-> u
forall u.
(forall d. Data d => d -> u)
-> SubmitSelfServiceSettingsFlowWithOidcMethodBody -> [u]
forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceSettingsFlowWithOidcMethodBody
-> r
forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceSettingsFlowWithOidcMethodBody
-> r
forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithOidcMethodBody
-> m SubmitSelfServiceSettingsFlowWithOidcMethodBody
forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithOidcMethodBody
-> m SubmitSelfServiceSettingsFlowWithOidcMethodBody
forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceSettingsFlowWithOidcMethodBody
forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceSettingsFlowWithOidcMethodBody
-> c SubmitSelfServiceSettingsFlowWithOidcMethodBody
forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceSettingsFlowWithOidcMethodBody)
forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceSettingsFlowWithOidcMethodBody)
$cSubmitSelfServiceSettingsFlowWithOidcMethodBody :: Constr
$tSubmitSelfServiceSettingsFlowWithOidcMethodBody :: DataType
gmapMo :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithOidcMethodBody
-> m SubmitSelfServiceSettingsFlowWithOidcMethodBody
$cgmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithOidcMethodBody
-> m SubmitSelfServiceSettingsFlowWithOidcMethodBody
gmapMp :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithOidcMethodBody
-> m SubmitSelfServiceSettingsFlowWithOidcMethodBody
$cgmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithOidcMethodBody
-> m SubmitSelfServiceSettingsFlowWithOidcMethodBody
gmapM :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithOidcMethodBody
-> m SubmitSelfServiceSettingsFlowWithOidcMethodBody
$cgmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithOidcMethodBody
-> m SubmitSelfServiceSettingsFlowWithOidcMethodBody
gmapQi :: Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceSettingsFlowWithOidcMethodBody
-> u
$cgmapQi :: forall u.
Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceSettingsFlowWithOidcMethodBody
-> u
gmapQ :: (forall d. Data d => d -> u)
-> SubmitSelfServiceSettingsFlowWithOidcMethodBody -> [u]
$cgmapQ :: forall u.
(forall d. Data d => d -> u)
-> SubmitSelfServiceSettingsFlowWithOidcMethodBody -> [u]
gmapQr :: (r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceSettingsFlowWithOidcMethodBody
-> r
$cgmapQr :: forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceSettingsFlowWithOidcMethodBody
-> r
gmapQl :: (r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceSettingsFlowWithOidcMethodBody
-> r
$cgmapQl :: forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceSettingsFlowWithOidcMethodBody
-> r
gmapT :: (forall b. Data b => b -> b)
-> SubmitSelfServiceSettingsFlowWithOidcMethodBody
-> SubmitSelfServiceSettingsFlowWithOidcMethodBody
$cgmapT :: (forall b. Data b => b -> b)
-> SubmitSelfServiceSettingsFlowWithOidcMethodBody
-> SubmitSelfServiceSettingsFlowWithOidcMethodBody
dataCast2 :: (forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceSettingsFlowWithOidcMethodBody)
$cdataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceSettingsFlowWithOidcMethodBody)
dataCast1 :: (forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceSettingsFlowWithOidcMethodBody)
$cdataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceSettingsFlowWithOidcMethodBody)
dataTypeOf :: SubmitSelfServiceSettingsFlowWithOidcMethodBody -> DataType
$cdataTypeOf :: SubmitSelfServiceSettingsFlowWithOidcMethodBody -> DataType
toConstr :: SubmitSelfServiceSettingsFlowWithOidcMethodBody -> Constr
$ctoConstr :: SubmitSelfServiceSettingsFlowWithOidcMethodBody -> Constr
gunfold :: (forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceSettingsFlowWithOidcMethodBody
$cgunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceSettingsFlowWithOidcMethodBody
gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceSettingsFlowWithOidcMethodBody
-> c SubmitSelfServiceSettingsFlowWithOidcMethodBody
$cgfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceSettingsFlowWithOidcMethodBody
-> c SubmitSelfServiceSettingsFlowWithOidcMethodBody
$cp1Data :: Typeable SubmitSelfServiceSettingsFlowWithOidcMethodBody
Data)

instance FromJSON SubmitSelfServiceSettingsFlowWithOidcMethodBody

instance ToJSON SubmitSelfServiceSettingsFlowWithOidcMethodBody where
  toEncoding :: SubmitSelfServiceSettingsFlowWithOidcMethodBody -> Encoding
toEncoding = Options
-> SubmitSelfServiceSettingsFlowWithOidcMethodBody -> Encoding
forall a.
(Generic a, GToJSON' Encoding Zero (Rep a)) =>
Options -> a -> Encoding
genericToEncoding Options
defaultOptions

data SubmitSelfServiceSettingsFlowWithPasswordMethodBody = SubmitSelfServiceSettingsFlowWithPasswordMethodBody
  { -- | CSRFToken is the anti-CSRF token
    SubmitSelfServiceSettingsFlowWithPasswordMethodBody -> Maybe Text
csrf_token :: Maybe Text,
    -- | Method  Should be set to password when trying to update a password.
    SubmitSelfServiceSettingsFlowWithPasswordMethodBody -> Text
method :: Text,
    -- | Password is the updated password
    SubmitSelfServiceSettingsFlowWithPasswordMethodBody -> Text
password :: Text
  }
  deriving stock (Int -> SubmitSelfServiceSettingsFlowWithPasswordMethodBody -> ShowS
[SubmitSelfServiceSettingsFlowWithPasswordMethodBody] -> ShowS
SubmitSelfServiceSettingsFlowWithPasswordMethodBody -> String
(Int
 -> SubmitSelfServiceSettingsFlowWithPasswordMethodBody -> ShowS)
-> (SubmitSelfServiceSettingsFlowWithPasswordMethodBody -> String)
-> ([SubmitSelfServiceSettingsFlowWithPasswordMethodBody] -> ShowS)
-> Show SubmitSelfServiceSettingsFlowWithPasswordMethodBody
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [SubmitSelfServiceSettingsFlowWithPasswordMethodBody] -> ShowS
$cshowList :: [SubmitSelfServiceSettingsFlowWithPasswordMethodBody] -> ShowS
show :: SubmitSelfServiceSettingsFlowWithPasswordMethodBody -> String
$cshow :: SubmitSelfServiceSettingsFlowWithPasswordMethodBody -> String
showsPrec :: Int -> SubmitSelfServiceSettingsFlowWithPasswordMethodBody -> ShowS
$cshowsPrec :: Int -> SubmitSelfServiceSettingsFlowWithPasswordMethodBody -> ShowS
Show, SubmitSelfServiceSettingsFlowWithPasswordMethodBody
-> SubmitSelfServiceSettingsFlowWithPasswordMethodBody -> Bool
(SubmitSelfServiceSettingsFlowWithPasswordMethodBody
 -> SubmitSelfServiceSettingsFlowWithPasswordMethodBody -> Bool)
-> (SubmitSelfServiceSettingsFlowWithPasswordMethodBody
    -> SubmitSelfServiceSettingsFlowWithPasswordMethodBody -> Bool)
-> Eq SubmitSelfServiceSettingsFlowWithPasswordMethodBody
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: SubmitSelfServiceSettingsFlowWithPasswordMethodBody
-> SubmitSelfServiceSettingsFlowWithPasswordMethodBody -> Bool
$c/= :: SubmitSelfServiceSettingsFlowWithPasswordMethodBody
-> SubmitSelfServiceSettingsFlowWithPasswordMethodBody -> Bool
== :: SubmitSelfServiceSettingsFlowWithPasswordMethodBody
-> SubmitSelfServiceSettingsFlowWithPasswordMethodBody -> Bool
$c== :: SubmitSelfServiceSettingsFlowWithPasswordMethodBody
-> SubmitSelfServiceSettingsFlowWithPasswordMethodBody -> Bool
Eq, (forall x.
 SubmitSelfServiceSettingsFlowWithPasswordMethodBody
 -> Rep SubmitSelfServiceSettingsFlowWithPasswordMethodBody x)
-> (forall x.
    Rep SubmitSelfServiceSettingsFlowWithPasswordMethodBody x
    -> SubmitSelfServiceSettingsFlowWithPasswordMethodBody)
-> Generic SubmitSelfServiceSettingsFlowWithPasswordMethodBody
forall x.
Rep SubmitSelfServiceSettingsFlowWithPasswordMethodBody x
-> SubmitSelfServiceSettingsFlowWithPasswordMethodBody
forall x.
SubmitSelfServiceSettingsFlowWithPasswordMethodBody
-> Rep SubmitSelfServiceSettingsFlowWithPasswordMethodBody x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep SubmitSelfServiceSettingsFlowWithPasswordMethodBody x
-> SubmitSelfServiceSettingsFlowWithPasswordMethodBody
$cfrom :: forall x.
SubmitSelfServiceSettingsFlowWithPasswordMethodBody
-> Rep SubmitSelfServiceSettingsFlowWithPasswordMethodBody x
Generic, Typeable SubmitSelfServiceSettingsFlowWithPasswordMethodBody
DataType
Constr
Typeable SubmitSelfServiceSettingsFlowWithPasswordMethodBody
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g)
    -> SubmitSelfServiceSettingsFlowWithPasswordMethodBody
    -> c SubmitSelfServiceSettingsFlowWithPasswordMethodBody)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r)
    -> Constr
    -> c SubmitSelfServiceSettingsFlowWithPasswordMethodBody)
-> (SubmitSelfServiceSettingsFlowWithPasswordMethodBody -> Constr)
-> (SubmitSelfServiceSettingsFlowWithPasswordMethodBody
    -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d))
    -> Maybe (c SubmitSelfServiceSettingsFlowWithPasswordMethodBody))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e))
    -> Maybe (c SubmitSelfServiceSettingsFlowWithPasswordMethodBody))
-> ((forall b. Data b => b -> b)
    -> SubmitSelfServiceSettingsFlowWithPasswordMethodBody
    -> SubmitSelfServiceSettingsFlowWithPasswordMethodBody)
-> (forall r r'.
    (r -> r' -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SubmitSelfServiceSettingsFlowWithPasswordMethodBody
    -> r)
-> (forall r r'.
    (r' -> r -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SubmitSelfServiceSettingsFlowWithPasswordMethodBody
    -> r)
-> (forall u.
    (forall d. Data d => d -> u)
    -> SubmitSelfServiceSettingsFlowWithPasswordMethodBody -> [u])
-> (forall u.
    Int
    -> (forall d. Data d => d -> u)
    -> SubmitSelfServiceSettingsFlowWithPasswordMethodBody
    -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceSettingsFlowWithPasswordMethodBody
    -> m SubmitSelfServiceSettingsFlowWithPasswordMethodBody)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceSettingsFlowWithPasswordMethodBody
    -> m SubmitSelfServiceSettingsFlowWithPasswordMethodBody)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceSettingsFlowWithPasswordMethodBody
    -> m SubmitSelfServiceSettingsFlowWithPasswordMethodBody)
-> Data SubmitSelfServiceSettingsFlowWithPasswordMethodBody
SubmitSelfServiceSettingsFlowWithPasswordMethodBody -> DataType
SubmitSelfServiceSettingsFlowWithPasswordMethodBody -> Constr
(forall b. Data b => b -> b)
-> SubmitSelfServiceSettingsFlowWithPasswordMethodBody
-> SubmitSelfServiceSettingsFlowWithPasswordMethodBody
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceSettingsFlowWithPasswordMethodBody
-> c SubmitSelfServiceSettingsFlowWithPasswordMethodBody
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceSettingsFlowWithPasswordMethodBody
forall a.
Typeable a
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g) -> a -> c a)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r) -> Constr -> c a)
-> (a -> Constr)
-> (a -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d)) -> Maybe (c a))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c a))
-> ((forall b. Data b => b -> b) -> a -> a)
-> (forall r r'.
    (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall r r'.
    (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall u. (forall d. Data d => d -> u) -> a -> [u])
-> (forall u. Int -> (forall d. Data d => d -> u) -> a -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> Data a
forall u.
Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceSettingsFlowWithPasswordMethodBody
-> u
forall u.
(forall d. Data d => d -> u)
-> SubmitSelfServiceSettingsFlowWithPasswordMethodBody -> [u]
forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceSettingsFlowWithPasswordMethodBody
-> r
forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceSettingsFlowWithPasswordMethodBody
-> r
forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithPasswordMethodBody
-> m SubmitSelfServiceSettingsFlowWithPasswordMethodBody
forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithPasswordMethodBody
-> m SubmitSelfServiceSettingsFlowWithPasswordMethodBody
forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceSettingsFlowWithPasswordMethodBody
forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceSettingsFlowWithPasswordMethodBody
-> c SubmitSelfServiceSettingsFlowWithPasswordMethodBody
forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceSettingsFlowWithPasswordMethodBody)
forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceSettingsFlowWithPasswordMethodBody)
$cSubmitSelfServiceSettingsFlowWithPasswordMethodBody :: Constr
$tSubmitSelfServiceSettingsFlowWithPasswordMethodBody :: DataType
gmapMo :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithPasswordMethodBody
-> m SubmitSelfServiceSettingsFlowWithPasswordMethodBody
$cgmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithPasswordMethodBody
-> m SubmitSelfServiceSettingsFlowWithPasswordMethodBody
gmapMp :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithPasswordMethodBody
-> m SubmitSelfServiceSettingsFlowWithPasswordMethodBody
$cgmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithPasswordMethodBody
-> m SubmitSelfServiceSettingsFlowWithPasswordMethodBody
gmapM :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithPasswordMethodBody
-> m SubmitSelfServiceSettingsFlowWithPasswordMethodBody
$cgmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithPasswordMethodBody
-> m SubmitSelfServiceSettingsFlowWithPasswordMethodBody
gmapQi :: Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceSettingsFlowWithPasswordMethodBody
-> u
$cgmapQi :: forall u.
Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceSettingsFlowWithPasswordMethodBody
-> u
gmapQ :: (forall d. Data d => d -> u)
-> SubmitSelfServiceSettingsFlowWithPasswordMethodBody -> [u]
$cgmapQ :: forall u.
(forall d. Data d => d -> u)
-> SubmitSelfServiceSettingsFlowWithPasswordMethodBody -> [u]
gmapQr :: (r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceSettingsFlowWithPasswordMethodBody
-> r
$cgmapQr :: forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceSettingsFlowWithPasswordMethodBody
-> r
gmapQl :: (r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceSettingsFlowWithPasswordMethodBody
-> r
$cgmapQl :: forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceSettingsFlowWithPasswordMethodBody
-> r
gmapT :: (forall b. Data b => b -> b)
-> SubmitSelfServiceSettingsFlowWithPasswordMethodBody
-> SubmitSelfServiceSettingsFlowWithPasswordMethodBody
$cgmapT :: (forall b. Data b => b -> b)
-> SubmitSelfServiceSettingsFlowWithPasswordMethodBody
-> SubmitSelfServiceSettingsFlowWithPasswordMethodBody
dataCast2 :: (forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceSettingsFlowWithPasswordMethodBody)
$cdataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceSettingsFlowWithPasswordMethodBody)
dataCast1 :: (forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceSettingsFlowWithPasswordMethodBody)
$cdataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceSettingsFlowWithPasswordMethodBody)
dataTypeOf :: SubmitSelfServiceSettingsFlowWithPasswordMethodBody -> DataType
$cdataTypeOf :: SubmitSelfServiceSettingsFlowWithPasswordMethodBody -> DataType
toConstr :: SubmitSelfServiceSettingsFlowWithPasswordMethodBody -> Constr
$ctoConstr :: SubmitSelfServiceSettingsFlowWithPasswordMethodBody -> Constr
gunfold :: (forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceSettingsFlowWithPasswordMethodBody
$cgunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceSettingsFlowWithPasswordMethodBody
gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceSettingsFlowWithPasswordMethodBody
-> c SubmitSelfServiceSettingsFlowWithPasswordMethodBody
$cgfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceSettingsFlowWithPasswordMethodBody
-> c SubmitSelfServiceSettingsFlowWithPasswordMethodBody
$cp1Data :: Typeable SubmitSelfServiceSettingsFlowWithPasswordMethodBody
Data)

instance FromJSON SubmitSelfServiceSettingsFlowWithPasswordMethodBody

instance ToJSON SubmitSelfServiceSettingsFlowWithPasswordMethodBody where
  toEncoding :: SubmitSelfServiceSettingsFlowWithPasswordMethodBody -> Encoding
toEncoding = Options
-> SubmitSelfServiceSettingsFlowWithPasswordMethodBody -> Encoding
forall a.
(Generic a, GToJSON' Encoding Zero (Rep a)) =>
Options -> a -> Encoding
genericToEncoding Options
defaultOptions

-- | nolint:deadcode,unused
data SubmitSelfServiceSettingsFlowWithProfileMethodBody = SubmitSelfServiceSettingsFlowWithProfileMethodBody
  { -- | The Anti-CSRF Token  This token is only required when performing browser flows.
    SubmitSelfServiceSettingsFlowWithProfileMethodBody -> Maybe Text
csrf_token :: Maybe Text,
    -- | Method  Should be set to profile when trying to update a profile.
    SubmitSelfServiceSettingsFlowWithProfileMethodBody -> Text
method :: Text,
    -- | Traits contains all of the identity's traits.
    SubmitSelfServiceSettingsFlowWithProfileMethodBody -> Value
traits :: Value
  }
  deriving stock (Int -> SubmitSelfServiceSettingsFlowWithProfileMethodBody -> ShowS
[SubmitSelfServiceSettingsFlowWithProfileMethodBody] -> ShowS
SubmitSelfServiceSettingsFlowWithProfileMethodBody -> String
(Int
 -> SubmitSelfServiceSettingsFlowWithProfileMethodBody -> ShowS)
-> (SubmitSelfServiceSettingsFlowWithProfileMethodBody -> String)
-> ([SubmitSelfServiceSettingsFlowWithProfileMethodBody] -> ShowS)
-> Show SubmitSelfServiceSettingsFlowWithProfileMethodBody
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [SubmitSelfServiceSettingsFlowWithProfileMethodBody] -> ShowS
$cshowList :: [SubmitSelfServiceSettingsFlowWithProfileMethodBody] -> ShowS
show :: SubmitSelfServiceSettingsFlowWithProfileMethodBody -> String
$cshow :: SubmitSelfServiceSettingsFlowWithProfileMethodBody -> String
showsPrec :: Int -> SubmitSelfServiceSettingsFlowWithProfileMethodBody -> ShowS
$cshowsPrec :: Int -> SubmitSelfServiceSettingsFlowWithProfileMethodBody -> ShowS
Show, SubmitSelfServiceSettingsFlowWithProfileMethodBody
-> SubmitSelfServiceSettingsFlowWithProfileMethodBody -> Bool
(SubmitSelfServiceSettingsFlowWithProfileMethodBody
 -> SubmitSelfServiceSettingsFlowWithProfileMethodBody -> Bool)
-> (SubmitSelfServiceSettingsFlowWithProfileMethodBody
    -> SubmitSelfServiceSettingsFlowWithProfileMethodBody -> Bool)
-> Eq SubmitSelfServiceSettingsFlowWithProfileMethodBody
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: SubmitSelfServiceSettingsFlowWithProfileMethodBody
-> SubmitSelfServiceSettingsFlowWithProfileMethodBody -> Bool
$c/= :: SubmitSelfServiceSettingsFlowWithProfileMethodBody
-> SubmitSelfServiceSettingsFlowWithProfileMethodBody -> Bool
== :: SubmitSelfServiceSettingsFlowWithProfileMethodBody
-> SubmitSelfServiceSettingsFlowWithProfileMethodBody -> Bool
$c== :: SubmitSelfServiceSettingsFlowWithProfileMethodBody
-> SubmitSelfServiceSettingsFlowWithProfileMethodBody -> Bool
Eq, (forall x.
 SubmitSelfServiceSettingsFlowWithProfileMethodBody
 -> Rep SubmitSelfServiceSettingsFlowWithProfileMethodBody x)
-> (forall x.
    Rep SubmitSelfServiceSettingsFlowWithProfileMethodBody x
    -> SubmitSelfServiceSettingsFlowWithProfileMethodBody)
-> Generic SubmitSelfServiceSettingsFlowWithProfileMethodBody
forall x.
Rep SubmitSelfServiceSettingsFlowWithProfileMethodBody x
-> SubmitSelfServiceSettingsFlowWithProfileMethodBody
forall x.
SubmitSelfServiceSettingsFlowWithProfileMethodBody
-> Rep SubmitSelfServiceSettingsFlowWithProfileMethodBody x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep SubmitSelfServiceSettingsFlowWithProfileMethodBody x
-> SubmitSelfServiceSettingsFlowWithProfileMethodBody
$cfrom :: forall x.
SubmitSelfServiceSettingsFlowWithProfileMethodBody
-> Rep SubmitSelfServiceSettingsFlowWithProfileMethodBody x
Generic, Typeable SubmitSelfServiceSettingsFlowWithProfileMethodBody
DataType
Constr
Typeable SubmitSelfServiceSettingsFlowWithProfileMethodBody
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g)
    -> SubmitSelfServiceSettingsFlowWithProfileMethodBody
    -> c SubmitSelfServiceSettingsFlowWithProfileMethodBody)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r)
    -> Constr
    -> c SubmitSelfServiceSettingsFlowWithProfileMethodBody)
-> (SubmitSelfServiceSettingsFlowWithProfileMethodBody -> Constr)
-> (SubmitSelfServiceSettingsFlowWithProfileMethodBody -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d))
    -> Maybe (c SubmitSelfServiceSettingsFlowWithProfileMethodBody))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e))
    -> Maybe (c SubmitSelfServiceSettingsFlowWithProfileMethodBody))
-> ((forall b. Data b => b -> b)
    -> SubmitSelfServiceSettingsFlowWithProfileMethodBody
    -> SubmitSelfServiceSettingsFlowWithProfileMethodBody)
-> (forall r r'.
    (r -> r' -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SubmitSelfServiceSettingsFlowWithProfileMethodBody
    -> r)
-> (forall r r'.
    (r' -> r -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SubmitSelfServiceSettingsFlowWithProfileMethodBody
    -> r)
-> (forall u.
    (forall d. Data d => d -> u)
    -> SubmitSelfServiceSettingsFlowWithProfileMethodBody -> [u])
-> (forall u.
    Int
    -> (forall d. Data d => d -> u)
    -> SubmitSelfServiceSettingsFlowWithProfileMethodBody
    -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceSettingsFlowWithProfileMethodBody
    -> m SubmitSelfServiceSettingsFlowWithProfileMethodBody)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceSettingsFlowWithProfileMethodBody
    -> m SubmitSelfServiceSettingsFlowWithProfileMethodBody)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceSettingsFlowWithProfileMethodBody
    -> m SubmitSelfServiceSettingsFlowWithProfileMethodBody)
-> Data SubmitSelfServiceSettingsFlowWithProfileMethodBody
SubmitSelfServiceSettingsFlowWithProfileMethodBody -> DataType
SubmitSelfServiceSettingsFlowWithProfileMethodBody -> Constr
(forall b. Data b => b -> b)
-> SubmitSelfServiceSettingsFlowWithProfileMethodBody
-> SubmitSelfServiceSettingsFlowWithProfileMethodBody
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceSettingsFlowWithProfileMethodBody
-> c SubmitSelfServiceSettingsFlowWithProfileMethodBody
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceSettingsFlowWithProfileMethodBody
forall a.
Typeable a
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g) -> a -> c a)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r) -> Constr -> c a)
-> (a -> Constr)
-> (a -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d)) -> Maybe (c a))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c a))
-> ((forall b. Data b => b -> b) -> a -> a)
-> (forall r r'.
    (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall r r'.
    (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall u. (forall d. Data d => d -> u) -> a -> [u])
-> (forall u. Int -> (forall d. Data d => d -> u) -> a -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> Data a
forall u.
Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceSettingsFlowWithProfileMethodBody
-> u
forall u.
(forall d. Data d => d -> u)
-> SubmitSelfServiceSettingsFlowWithProfileMethodBody -> [u]
forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceSettingsFlowWithProfileMethodBody
-> r
forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceSettingsFlowWithProfileMethodBody
-> r
forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithProfileMethodBody
-> m SubmitSelfServiceSettingsFlowWithProfileMethodBody
forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithProfileMethodBody
-> m SubmitSelfServiceSettingsFlowWithProfileMethodBody
forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceSettingsFlowWithProfileMethodBody
forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceSettingsFlowWithProfileMethodBody
-> c SubmitSelfServiceSettingsFlowWithProfileMethodBody
forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceSettingsFlowWithProfileMethodBody)
forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceSettingsFlowWithProfileMethodBody)
$cSubmitSelfServiceSettingsFlowWithProfileMethodBody :: Constr
$tSubmitSelfServiceSettingsFlowWithProfileMethodBody :: DataType
gmapMo :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithProfileMethodBody
-> m SubmitSelfServiceSettingsFlowWithProfileMethodBody
$cgmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithProfileMethodBody
-> m SubmitSelfServiceSettingsFlowWithProfileMethodBody
gmapMp :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithProfileMethodBody
-> m SubmitSelfServiceSettingsFlowWithProfileMethodBody
$cgmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithProfileMethodBody
-> m SubmitSelfServiceSettingsFlowWithProfileMethodBody
gmapM :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithProfileMethodBody
-> m SubmitSelfServiceSettingsFlowWithProfileMethodBody
$cgmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithProfileMethodBody
-> m SubmitSelfServiceSettingsFlowWithProfileMethodBody
gmapQi :: Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceSettingsFlowWithProfileMethodBody
-> u
$cgmapQi :: forall u.
Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceSettingsFlowWithProfileMethodBody
-> u
gmapQ :: (forall d. Data d => d -> u)
-> SubmitSelfServiceSettingsFlowWithProfileMethodBody -> [u]
$cgmapQ :: forall u.
(forall d. Data d => d -> u)
-> SubmitSelfServiceSettingsFlowWithProfileMethodBody -> [u]
gmapQr :: (r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceSettingsFlowWithProfileMethodBody
-> r
$cgmapQr :: forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceSettingsFlowWithProfileMethodBody
-> r
gmapQl :: (r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceSettingsFlowWithProfileMethodBody
-> r
$cgmapQl :: forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceSettingsFlowWithProfileMethodBody
-> r
gmapT :: (forall b. Data b => b -> b)
-> SubmitSelfServiceSettingsFlowWithProfileMethodBody
-> SubmitSelfServiceSettingsFlowWithProfileMethodBody
$cgmapT :: (forall b. Data b => b -> b)
-> SubmitSelfServiceSettingsFlowWithProfileMethodBody
-> SubmitSelfServiceSettingsFlowWithProfileMethodBody
dataCast2 :: (forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceSettingsFlowWithProfileMethodBody)
$cdataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceSettingsFlowWithProfileMethodBody)
dataCast1 :: (forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceSettingsFlowWithProfileMethodBody)
$cdataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceSettingsFlowWithProfileMethodBody)
dataTypeOf :: SubmitSelfServiceSettingsFlowWithProfileMethodBody -> DataType
$cdataTypeOf :: SubmitSelfServiceSettingsFlowWithProfileMethodBody -> DataType
toConstr :: SubmitSelfServiceSettingsFlowWithProfileMethodBody -> Constr
$ctoConstr :: SubmitSelfServiceSettingsFlowWithProfileMethodBody -> Constr
gunfold :: (forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceSettingsFlowWithProfileMethodBody
$cgunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceSettingsFlowWithProfileMethodBody
gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceSettingsFlowWithProfileMethodBody
-> c SubmitSelfServiceSettingsFlowWithProfileMethodBody
$cgfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceSettingsFlowWithProfileMethodBody
-> c SubmitSelfServiceSettingsFlowWithProfileMethodBody
$cp1Data :: Typeable SubmitSelfServiceSettingsFlowWithProfileMethodBody
Data)

instance FromJSON SubmitSelfServiceSettingsFlowWithProfileMethodBody

instance ToJSON SubmitSelfServiceSettingsFlowWithProfileMethodBody where
  toEncoding :: SubmitSelfServiceSettingsFlowWithProfileMethodBody -> Encoding
toEncoding = Options
-> SubmitSelfServiceSettingsFlowWithProfileMethodBody -> Encoding
forall a.
(Generic a, GToJSON' Encoding Zero (Rep a)) =>
Options -> a -> Encoding
genericToEncoding Options
defaultOptions

data SubmitSelfServiceSettingsFlowWithTotpMethodBody = SubmitSelfServiceSettingsFlowWithTotpMethodBody
  { -- | CSRFToken is the anti-CSRF token
    SubmitSelfServiceSettingsFlowWithTotpMethodBody -> Maybe Text
csrf_token :: Maybe Text,
    -- | Method  Should be set to \"totp\" when trying to add, update, or remove a totp pairing.
    SubmitSelfServiceSettingsFlowWithTotpMethodBody -> Text
method :: Text,
    -- | ValidationTOTP must contain a valid TOTP based on the
    SubmitSelfServiceSettingsFlowWithTotpMethodBody -> Maybe Text
totp_code :: Maybe Text,
    -- | UnlinkTOTP if true will remove the TOTP pairing, effectively removing the credential. This can be used to set up a new TOTP device.
    SubmitSelfServiceSettingsFlowWithTotpMethodBody -> Maybe Bool
totp_unlink :: Maybe Bool
  }
  deriving stock (Int -> SubmitSelfServiceSettingsFlowWithTotpMethodBody -> ShowS
[SubmitSelfServiceSettingsFlowWithTotpMethodBody] -> ShowS
SubmitSelfServiceSettingsFlowWithTotpMethodBody -> String
(Int -> SubmitSelfServiceSettingsFlowWithTotpMethodBody -> ShowS)
-> (SubmitSelfServiceSettingsFlowWithTotpMethodBody -> String)
-> ([SubmitSelfServiceSettingsFlowWithTotpMethodBody] -> ShowS)
-> Show SubmitSelfServiceSettingsFlowWithTotpMethodBody
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [SubmitSelfServiceSettingsFlowWithTotpMethodBody] -> ShowS
$cshowList :: [SubmitSelfServiceSettingsFlowWithTotpMethodBody] -> ShowS
show :: SubmitSelfServiceSettingsFlowWithTotpMethodBody -> String
$cshow :: SubmitSelfServiceSettingsFlowWithTotpMethodBody -> String
showsPrec :: Int -> SubmitSelfServiceSettingsFlowWithTotpMethodBody -> ShowS
$cshowsPrec :: Int -> SubmitSelfServiceSettingsFlowWithTotpMethodBody -> ShowS
Show, SubmitSelfServiceSettingsFlowWithTotpMethodBody
-> SubmitSelfServiceSettingsFlowWithTotpMethodBody -> Bool
(SubmitSelfServiceSettingsFlowWithTotpMethodBody
 -> SubmitSelfServiceSettingsFlowWithTotpMethodBody -> Bool)
-> (SubmitSelfServiceSettingsFlowWithTotpMethodBody
    -> SubmitSelfServiceSettingsFlowWithTotpMethodBody -> Bool)
-> Eq SubmitSelfServiceSettingsFlowWithTotpMethodBody
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: SubmitSelfServiceSettingsFlowWithTotpMethodBody
-> SubmitSelfServiceSettingsFlowWithTotpMethodBody -> Bool
$c/= :: SubmitSelfServiceSettingsFlowWithTotpMethodBody
-> SubmitSelfServiceSettingsFlowWithTotpMethodBody -> Bool
== :: SubmitSelfServiceSettingsFlowWithTotpMethodBody
-> SubmitSelfServiceSettingsFlowWithTotpMethodBody -> Bool
$c== :: SubmitSelfServiceSettingsFlowWithTotpMethodBody
-> SubmitSelfServiceSettingsFlowWithTotpMethodBody -> Bool
Eq, (forall x.
 SubmitSelfServiceSettingsFlowWithTotpMethodBody
 -> Rep SubmitSelfServiceSettingsFlowWithTotpMethodBody x)
-> (forall x.
    Rep SubmitSelfServiceSettingsFlowWithTotpMethodBody x
    -> SubmitSelfServiceSettingsFlowWithTotpMethodBody)
-> Generic SubmitSelfServiceSettingsFlowWithTotpMethodBody
forall x.
Rep SubmitSelfServiceSettingsFlowWithTotpMethodBody x
-> SubmitSelfServiceSettingsFlowWithTotpMethodBody
forall x.
SubmitSelfServiceSettingsFlowWithTotpMethodBody
-> Rep SubmitSelfServiceSettingsFlowWithTotpMethodBody x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep SubmitSelfServiceSettingsFlowWithTotpMethodBody x
-> SubmitSelfServiceSettingsFlowWithTotpMethodBody
$cfrom :: forall x.
SubmitSelfServiceSettingsFlowWithTotpMethodBody
-> Rep SubmitSelfServiceSettingsFlowWithTotpMethodBody x
Generic, Typeable SubmitSelfServiceSettingsFlowWithTotpMethodBody
DataType
Constr
Typeable SubmitSelfServiceSettingsFlowWithTotpMethodBody
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g)
    -> SubmitSelfServiceSettingsFlowWithTotpMethodBody
    -> c SubmitSelfServiceSettingsFlowWithTotpMethodBody)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r)
    -> Constr
    -> c SubmitSelfServiceSettingsFlowWithTotpMethodBody)
-> (SubmitSelfServiceSettingsFlowWithTotpMethodBody -> Constr)
-> (SubmitSelfServiceSettingsFlowWithTotpMethodBody -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d))
    -> Maybe (c SubmitSelfServiceSettingsFlowWithTotpMethodBody))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e))
    -> Maybe (c SubmitSelfServiceSettingsFlowWithTotpMethodBody))
-> ((forall b. Data b => b -> b)
    -> SubmitSelfServiceSettingsFlowWithTotpMethodBody
    -> SubmitSelfServiceSettingsFlowWithTotpMethodBody)
-> (forall r r'.
    (r -> r' -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SubmitSelfServiceSettingsFlowWithTotpMethodBody
    -> r)
-> (forall r r'.
    (r' -> r -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SubmitSelfServiceSettingsFlowWithTotpMethodBody
    -> r)
-> (forall u.
    (forall d. Data d => d -> u)
    -> SubmitSelfServiceSettingsFlowWithTotpMethodBody -> [u])
-> (forall u.
    Int
    -> (forall d. Data d => d -> u)
    -> SubmitSelfServiceSettingsFlowWithTotpMethodBody
    -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceSettingsFlowWithTotpMethodBody
    -> m SubmitSelfServiceSettingsFlowWithTotpMethodBody)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceSettingsFlowWithTotpMethodBody
    -> m SubmitSelfServiceSettingsFlowWithTotpMethodBody)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceSettingsFlowWithTotpMethodBody
    -> m SubmitSelfServiceSettingsFlowWithTotpMethodBody)
-> Data SubmitSelfServiceSettingsFlowWithTotpMethodBody
SubmitSelfServiceSettingsFlowWithTotpMethodBody -> DataType
SubmitSelfServiceSettingsFlowWithTotpMethodBody -> Constr
(forall b. Data b => b -> b)
-> SubmitSelfServiceSettingsFlowWithTotpMethodBody
-> SubmitSelfServiceSettingsFlowWithTotpMethodBody
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceSettingsFlowWithTotpMethodBody
-> c SubmitSelfServiceSettingsFlowWithTotpMethodBody
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceSettingsFlowWithTotpMethodBody
forall a.
Typeable a
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g) -> a -> c a)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r) -> Constr -> c a)
-> (a -> Constr)
-> (a -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d)) -> Maybe (c a))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c a))
-> ((forall b. Data b => b -> b) -> a -> a)
-> (forall r r'.
    (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall r r'.
    (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall u. (forall d. Data d => d -> u) -> a -> [u])
-> (forall u. Int -> (forall d. Data d => d -> u) -> a -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> Data a
forall u.
Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceSettingsFlowWithTotpMethodBody
-> u
forall u.
(forall d. Data d => d -> u)
-> SubmitSelfServiceSettingsFlowWithTotpMethodBody -> [u]
forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceSettingsFlowWithTotpMethodBody
-> r
forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceSettingsFlowWithTotpMethodBody
-> r
forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithTotpMethodBody
-> m SubmitSelfServiceSettingsFlowWithTotpMethodBody
forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithTotpMethodBody
-> m SubmitSelfServiceSettingsFlowWithTotpMethodBody
forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceSettingsFlowWithTotpMethodBody
forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceSettingsFlowWithTotpMethodBody
-> c SubmitSelfServiceSettingsFlowWithTotpMethodBody
forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceSettingsFlowWithTotpMethodBody)
forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceSettingsFlowWithTotpMethodBody)
$cSubmitSelfServiceSettingsFlowWithTotpMethodBody :: Constr
$tSubmitSelfServiceSettingsFlowWithTotpMethodBody :: DataType
gmapMo :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithTotpMethodBody
-> m SubmitSelfServiceSettingsFlowWithTotpMethodBody
$cgmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithTotpMethodBody
-> m SubmitSelfServiceSettingsFlowWithTotpMethodBody
gmapMp :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithTotpMethodBody
-> m SubmitSelfServiceSettingsFlowWithTotpMethodBody
$cgmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithTotpMethodBody
-> m SubmitSelfServiceSettingsFlowWithTotpMethodBody
gmapM :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithTotpMethodBody
-> m SubmitSelfServiceSettingsFlowWithTotpMethodBody
$cgmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithTotpMethodBody
-> m SubmitSelfServiceSettingsFlowWithTotpMethodBody
gmapQi :: Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceSettingsFlowWithTotpMethodBody
-> u
$cgmapQi :: forall u.
Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceSettingsFlowWithTotpMethodBody
-> u
gmapQ :: (forall d. Data d => d -> u)
-> SubmitSelfServiceSettingsFlowWithTotpMethodBody -> [u]
$cgmapQ :: forall u.
(forall d. Data d => d -> u)
-> SubmitSelfServiceSettingsFlowWithTotpMethodBody -> [u]
gmapQr :: (r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceSettingsFlowWithTotpMethodBody
-> r
$cgmapQr :: forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceSettingsFlowWithTotpMethodBody
-> r
gmapQl :: (r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceSettingsFlowWithTotpMethodBody
-> r
$cgmapQl :: forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceSettingsFlowWithTotpMethodBody
-> r
gmapT :: (forall b. Data b => b -> b)
-> SubmitSelfServiceSettingsFlowWithTotpMethodBody
-> SubmitSelfServiceSettingsFlowWithTotpMethodBody
$cgmapT :: (forall b. Data b => b -> b)
-> SubmitSelfServiceSettingsFlowWithTotpMethodBody
-> SubmitSelfServiceSettingsFlowWithTotpMethodBody
dataCast2 :: (forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceSettingsFlowWithTotpMethodBody)
$cdataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceSettingsFlowWithTotpMethodBody)
dataCast1 :: (forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceSettingsFlowWithTotpMethodBody)
$cdataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceSettingsFlowWithTotpMethodBody)
dataTypeOf :: SubmitSelfServiceSettingsFlowWithTotpMethodBody -> DataType
$cdataTypeOf :: SubmitSelfServiceSettingsFlowWithTotpMethodBody -> DataType
toConstr :: SubmitSelfServiceSettingsFlowWithTotpMethodBody -> Constr
$ctoConstr :: SubmitSelfServiceSettingsFlowWithTotpMethodBody -> Constr
gunfold :: (forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceSettingsFlowWithTotpMethodBody
$cgunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceSettingsFlowWithTotpMethodBody
gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceSettingsFlowWithTotpMethodBody
-> c SubmitSelfServiceSettingsFlowWithTotpMethodBody
$cgfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceSettingsFlowWithTotpMethodBody
-> c SubmitSelfServiceSettingsFlowWithTotpMethodBody
$cp1Data :: Typeable SubmitSelfServiceSettingsFlowWithTotpMethodBody
Data)

instance FromJSON SubmitSelfServiceSettingsFlowWithTotpMethodBody

instance ToJSON SubmitSelfServiceSettingsFlowWithTotpMethodBody where
  toEncoding :: SubmitSelfServiceSettingsFlowWithTotpMethodBody -> Encoding
toEncoding = Options
-> SubmitSelfServiceSettingsFlowWithTotpMethodBody -> Encoding
forall a.
(Generic a, GToJSON' Encoding Zero (Rep a)) =>
Options -> a -> Encoding
genericToEncoding Options
defaultOptions

data SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody = SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
  { -- | CSRFToken is the anti-CSRF token
    SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody -> Maybe Text
csrf_token :: Maybe Text,
    -- | Method  Should be set to \"webauthn\" when trying to add, update, or remove a webAuthn pairing.
    SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody -> Text
method :: Text,
    -- | Register a WebAuthn Security Key  It is expected that the JSON returned by the WebAuthn registration process is included here.
    SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody -> Maybe Text
webauthn_register :: Maybe Text,
    -- | Name of the WebAuthn Security Key to be Added  A human-readable name for the security key which will be added.
    SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody -> Maybe Text
webauthn_register_displayname :: Maybe Text,
    -- | Remove a WebAuthn Security Key  This must contain the ID of the WebAuthN connection.
    SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody -> Maybe Text
webauthn_remove :: Maybe Text
  }
  deriving stock (Int -> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody -> ShowS
[SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody] -> ShowS
SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody -> String
(Int
 -> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody -> ShowS)
-> (SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody -> String)
-> ([SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody] -> ShowS)
-> Show SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody] -> ShowS
$cshowList :: [SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody] -> ShowS
show :: SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody -> String
$cshow :: SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody -> String
showsPrec :: Int -> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody -> ShowS
$cshowsPrec :: Int -> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody -> ShowS
Show, SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
-> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody -> Bool
(SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
 -> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody -> Bool)
-> (SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
    -> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody -> Bool)
-> Eq SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
-> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody -> Bool
$c/= :: SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
-> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody -> Bool
== :: SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
-> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody -> Bool
$c== :: SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
-> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody -> Bool
Eq, (forall x.
 SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
 -> Rep SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody x)
-> (forall x.
    Rep SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody x
    -> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody)
-> Generic SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
forall x.
Rep SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody x
-> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
forall x.
SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
-> Rep SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody x
-> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
$cfrom :: forall x.
SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
-> Rep SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody x
Generic, Typeable SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
DataType
Constr
Typeable SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g)
    -> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
    -> c SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r)
    -> Constr
    -> c SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody)
-> (SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody -> Constr)
-> (SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
    -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d))
    -> Maybe (c SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e))
    -> Maybe (c SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody))
-> ((forall b. Data b => b -> b)
    -> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
    -> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody)
-> (forall r r'.
    (r -> r' -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
    -> r)
-> (forall r r'.
    (r' -> r -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
    -> r)
-> (forall u.
    (forall d. Data d => d -> u)
    -> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody -> [u])
-> (forall u.
    Int
    -> (forall d. Data d => d -> u)
    -> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
    -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
    -> m SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
    -> m SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
    -> m SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody)
-> Data SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody -> DataType
SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody -> Constr
(forall b. Data b => b -> b)
-> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
-> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
-> c SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
forall a.
Typeable a
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g) -> a -> c a)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r) -> Constr -> c a)
-> (a -> Constr)
-> (a -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d)) -> Maybe (c a))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c a))
-> ((forall b. Data b => b -> b) -> a -> a)
-> (forall r r'.
    (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall r r'.
    (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall u. (forall d. Data d => d -> u) -> a -> [u])
-> (forall u. Int -> (forall d. Data d => d -> u) -> a -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> Data a
forall u.
Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
-> u
forall u.
(forall d. Data d => d -> u)
-> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody -> [u]
forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
-> r
forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
-> r
forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
-> m SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
-> m SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
-> c SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody)
forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody)
$cSubmitSelfServiceSettingsFlowWithWebAuthnMethodBody :: Constr
$tSubmitSelfServiceSettingsFlowWithWebAuthnMethodBody :: DataType
gmapMo :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
-> m SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
$cgmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
-> m SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
gmapMp :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
-> m SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
$cgmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
-> m SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
gmapM :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
-> m SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
$cgmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
-> m SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
gmapQi :: Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
-> u
$cgmapQi :: forall u.
Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
-> u
gmapQ :: (forall d. Data d => d -> u)
-> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody -> [u]
$cgmapQ :: forall u.
(forall d. Data d => d -> u)
-> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody -> [u]
gmapQr :: (r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
-> r
$cgmapQr :: forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
-> r
gmapQl :: (r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
-> r
$cgmapQl :: forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
-> r
gmapT :: (forall b. Data b => b -> b)
-> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
-> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
$cgmapT :: (forall b. Data b => b -> b)
-> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
-> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
dataCast2 :: (forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody)
$cdataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody)
dataCast1 :: (forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody)
$cdataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody)
dataTypeOf :: SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody -> DataType
$cdataTypeOf :: SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody -> DataType
toConstr :: SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody -> Constr
$ctoConstr :: SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody -> Constr
gunfold :: (forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
$cgunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
-> c SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
$cgfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
-> c SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
$cp1Data :: Typeable SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody
Data)

instance FromJSON SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody

instance ToJSON SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody where
  toEncoding :: SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody -> Encoding
toEncoding = Options
-> SubmitSelfServiceSettingsFlowWithWebAuthnMethodBody -> Encoding
forall a.
(Generic a, GToJSON' Encoding Zero (Rep a)) =>
Options -> a -> Encoding
genericToEncoding Options
defaultOptions

-- | nolint:deadcode,unused
data SubmitSelfServiceVerificationFlowBody = SubmitSelfServiceVerificationFlowBody
  { -- | Sending the anti-csrf token is only required for browser login flows.
    SubmitSelfServiceVerificationFlowBody -> Maybe Text
csrf_token :: 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
    SubmitSelfServiceVerificationFlowBody -> Text
email :: Text,
    -- | Method supports `link` only right now.
    SubmitSelfServiceVerificationFlowBody -> Text
method :: Text
  }
  deriving stock (Int -> SubmitSelfServiceVerificationFlowBody -> ShowS
[SubmitSelfServiceVerificationFlowBody] -> ShowS
SubmitSelfServiceVerificationFlowBody -> String
(Int -> SubmitSelfServiceVerificationFlowBody -> ShowS)
-> (SubmitSelfServiceVerificationFlowBody -> String)
-> ([SubmitSelfServiceVerificationFlowBody] -> ShowS)
-> Show SubmitSelfServiceVerificationFlowBody
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [SubmitSelfServiceVerificationFlowBody] -> ShowS
$cshowList :: [SubmitSelfServiceVerificationFlowBody] -> ShowS
show :: SubmitSelfServiceVerificationFlowBody -> String
$cshow :: SubmitSelfServiceVerificationFlowBody -> String
showsPrec :: Int -> SubmitSelfServiceVerificationFlowBody -> ShowS
$cshowsPrec :: Int -> SubmitSelfServiceVerificationFlowBody -> ShowS
Show, SubmitSelfServiceVerificationFlowBody
-> SubmitSelfServiceVerificationFlowBody -> Bool
(SubmitSelfServiceVerificationFlowBody
 -> SubmitSelfServiceVerificationFlowBody -> Bool)
-> (SubmitSelfServiceVerificationFlowBody
    -> SubmitSelfServiceVerificationFlowBody -> Bool)
-> Eq SubmitSelfServiceVerificationFlowBody
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: SubmitSelfServiceVerificationFlowBody
-> SubmitSelfServiceVerificationFlowBody -> Bool
$c/= :: SubmitSelfServiceVerificationFlowBody
-> SubmitSelfServiceVerificationFlowBody -> Bool
== :: SubmitSelfServiceVerificationFlowBody
-> SubmitSelfServiceVerificationFlowBody -> Bool
$c== :: SubmitSelfServiceVerificationFlowBody
-> SubmitSelfServiceVerificationFlowBody -> Bool
Eq, (forall x.
 SubmitSelfServiceVerificationFlowBody
 -> Rep SubmitSelfServiceVerificationFlowBody x)
-> (forall x.
    Rep SubmitSelfServiceVerificationFlowBody x
    -> SubmitSelfServiceVerificationFlowBody)
-> Generic SubmitSelfServiceVerificationFlowBody
forall x.
Rep SubmitSelfServiceVerificationFlowBody x
-> SubmitSelfServiceVerificationFlowBody
forall x.
SubmitSelfServiceVerificationFlowBody
-> Rep SubmitSelfServiceVerificationFlowBody x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep SubmitSelfServiceVerificationFlowBody x
-> SubmitSelfServiceVerificationFlowBody
$cfrom :: forall x.
SubmitSelfServiceVerificationFlowBody
-> Rep SubmitSelfServiceVerificationFlowBody x
Generic, Typeable SubmitSelfServiceVerificationFlowBody
DataType
Constr
Typeable SubmitSelfServiceVerificationFlowBody
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g)
    -> SubmitSelfServiceVerificationFlowBody
    -> c SubmitSelfServiceVerificationFlowBody)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r)
    -> Constr
    -> c SubmitSelfServiceVerificationFlowBody)
-> (SubmitSelfServiceVerificationFlowBody -> Constr)
-> (SubmitSelfServiceVerificationFlowBody -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d))
    -> Maybe (c SubmitSelfServiceVerificationFlowBody))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e))
    -> Maybe (c SubmitSelfServiceVerificationFlowBody))
-> ((forall b. Data b => b -> b)
    -> SubmitSelfServiceVerificationFlowBody
    -> SubmitSelfServiceVerificationFlowBody)
-> (forall r r'.
    (r -> r' -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SubmitSelfServiceVerificationFlowBody
    -> r)
-> (forall r r'.
    (r' -> r -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SubmitSelfServiceVerificationFlowBody
    -> r)
-> (forall u.
    (forall d. Data d => d -> u)
    -> SubmitSelfServiceVerificationFlowBody -> [u])
-> (forall u.
    Int
    -> (forall d. Data d => d -> u)
    -> SubmitSelfServiceVerificationFlowBody
    -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceVerificationFlowBody
    -> m SubmitSelfServiceVerificationFlowBody)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceVerificationFlowBody
    -> m SubmitSelfServiceVerificationFlowBody)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceVerificationFlowBody
    -> m SubmitSelfServiceVerificationFlowBody)
-> Data SubmitSelfServiceVerificationFlowBody
SubmitSelfServiceVerificationFlowBody -> DataType
SubmitSelfServiceVerificationFlowBody -> Constr
(forall b. Data b => b -> b)
-> SubmitSelfServiceVerificationFlowBody
-> SubmitSelfServiceVerificationFlowBody
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceVerificationFlowBody
-> c SubmitSelfServiceVerificationFlowBody
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceVerificationFlowBody
forall a.
Typeable a
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g) -> a -> c a)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r) -> Constr -> c a)
-> (a -> Constr)
-> (a -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d)) -> Maybe (c a))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c a))
-> ((forall b. Data b => b -> b) -> a -> a)
-> (forall r r'.
    (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall r r'.
    (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall u. (forall d. Data d => d -> u) -> a -> [u])
-> (forall u. Int -> (forall d. Data d => d -> u) -> a -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> Data a
forall u.
Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceVerificationFlowBody
-> u
forall u.
(forall d. Data d => d -> u)
-> SubmitSelfServiceVerificationFlowBody -> [u]
forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceVerificationFlowBody
-> r
forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceVerificationFlowBody
-> r
forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceVerificationFlowBody
-> m SubmitSelfServiceVerificationFlowBody
forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceVerificationFlowBody
-> m SubmitSelfServiceVerificationFlowBody
forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceVerificationFlowBody
forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceVerificationFlowBody
-> c SubmitSelfServiceVerificationFlowBody
forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceVerificationFlowBody)
forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceVerificationFlowBody)
$cSubmitSelfServiceVerificationFlowBody :: Constr
$tSubmitSelfServiceVerificationFlowBody :: DataType
gmapMo :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceVerificationFlowBody
-> m SubmitSelfServiceVerificationFlowBody
$cgmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceVerificationFlowBody
-> m SubmitSelfServiceVerificationFlowBody
gmapMp :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceVerificationFlowBody
-> m SubmitSelfServiceVerificationFlowBody
$cgmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceVerificationFlowBody
-> m SubmitSelfServiceVerificationFlowBody
gmapM :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceVerificationFlowBody
-> m SubmitSelfServiceVerificationFlowBody
$cgmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceVerificationFlowBody
-> m SubmitSelfServiceVerificationFlowBody
gmapQi :: Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceVerificationFlowBody
-> u
$cgmapQi :: forall u.
Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceVerificationFlowBody
-> u
gmapQ :: (forall d. Data d => d -> u)
-> SubmitSelfServiceVerificationFlowBody -> [u]
$cgmapQ :: forall u.
(forall d. Data d => d -> u)
-> SubmitSelfServiceVerificationFlowBody -> [u]
gmapQr :: (r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceVerificationFlowBody
-> r
$cgmapQr :: forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceVerificationFlowBody
-> r
gmapQl :: (r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceVerificationFlowBody
-> r
$cgmapQl :: forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceVerificationFlowBody
-> r
gmapT :: (forall b. Data b => b -> b)
-> SubmitSelfServiceVerificationFlowBody
-> SubmitSelfServiceVerificationFlowBody
$cgmapT :: (forall b. Data b => b -> b)
-> SubmitSelfServiceVerificationFlowBody
-> SubmitSelfServiceVerificationFlowBody
dataCast2 :: (forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceVerificationFlowBody)
$cdataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceVerificationFlowBody)
dataCast1 :: (forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceVerificationFlowBody)
$cdataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceVerificationFlowBody)
dataTypeOf :: SubmitSelfServiceVerificationFlowBody -> DataType
$cdataTypeOf :: SubmitSelfServiceVerificationFlowBody -> DataType
toConstr :: SubmitSelfServiceVerificationFlowBody -> Constr
$ctoConstr :: SubmitSelfServiceVerificationFlowBody -> Constr
gunfold :: (forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceVerificationFlowBody
$cgunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceVerificationFlowBody
gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceVerificationFlowBody
-> c SubmitSelfServiceVerificationFlowBody
$cgfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceVerificationFlowBody
-> c SubmitSelfServiceVerificationFlowBody
$cp1Data :: Typeable SubmitSelfServiceVerificationFlowBody
Data)

instance FromJSON SubmitSelfServiceVerificationFlowBody

instance ToJSON SubmitSelfServiceVerificationFlowBody where
  toEncoding :: SubmitSelfServiceVerificationFlowBody -> Encoding
toEncoding = Options -> SubmitSelfServiceVerificationFlowBody -> Encoding
forall a.
(Generic a, GToJSON' Encoding Zero (Rep a)) =>
Options -> a -> Encoding
genericToEncoding Options
defaultOptions

data SubmitSelfServiceVerificationFlowWithLinkMethodBody = SubmitSelfServiceVerificationFlowWithLinkMethodBody
  { -- | Sending the anti-csrf token is only required for browser login flows.
    SubmitSelfServiceVerificationFlowWithLinkMethodBody -> Maybe Text
csrf_token :: 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
    SubmitSelfServiceVerificationFlowWithLinkMethodBody -> Text
email :: Text,
    -- | Method supports `link` only right now.
    SubmitSelfServiceVerificationFlowWithLinkMethodBody -> Text
method :: Text
  }
  deriving stock (Int -> SubmitSelfServiceVerificationFlowWithLinkMethodBody -> ShowS
[SubmitSelfServiceVerificationFlowWithLinkMethodBody] -> ShowS
SubmitSelfServiceVerificationFlowWithLinkMethodBody -> String
(Int
 -> SubmitSelfServiceVerificationFlowWithLinkMethodBody -> ShowS)
-> (SubmitSelfServiceVerificationFlowWithLinkMethodBody -> String)
-> ([SubmitSelfServiceVerificationFlowWithLinkMethodBody] -> ShowS)
-> Show SubmitSelfServiceVerificationFlowWithLinkMethodBody
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [SubmitSelfServiceVerificationFlowWithLinkMethodBody] -> ShowS
$cshowList :: [SubmitSelfServiceVerificationFlowWithLinkMethodBody] -> ShowS
show :: SubmitSelfServiceVerificationFlowWithLinkMethodBody -> String
$cshow :: SubmitSelfServiceVerificationFlowWithLinkMethodBody -> String
showsPrec :: Int -> SubmitSelfServiceVerificationFlowWithLinkMethodBody -> ShowS
$cshowsPrec :: Int -> SubmitSelfServiceVerificationFlowWithLinkMethodBody -> ShowS
Show, SubmitSelfServiceVerificationFlowWithLinkMethodBody
-> SubmitSelfServiceVerificationFlowWithLinkMethodBody -> Bool
(SubmitSelfServiceVerificationFlowWithLinkMethodBody
 -> SubmitSelfServiceVerificationFlowWithLinkMethodBody -> Bool)
-> (SubmitSelfServiceVerificationFlowWithLinkMethodBody
    -> SubmitSelfServiceVerificationFlowWithLinkMethodBody -> Bool)
-> Eq SubmitSelfServiceVerificationFlowWithLinkMethodBody
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: SubmitSelfServiceVerificationFlowWithLinkMethodBody
-> SubmitSelfServiceVerificationFlowWithLinkMethodBody -> Bool
$c/= :: SubmitSelfServiceVerificationFlowWithLinkMethodBody
-> SubmitSelfServiceVerificationFlowWithLinkMethodBody -> Bool
== :: SubmitSelfServiceVerificationFlowWithLinkMethodBody
-> SubmitSelfServiceVerificationFlowWithLinkMethodBody -> Bool
$c== :: SubmitSelfServiceVerificationFlowWithLinkMethodBody
-> SubmitSelfServiceVerificationFlowWithLinkMethodBody -> Bool
Eq, (forall x.
 SubmitSelfServiceVerificationFlowWithLinkMethodBody
 -> Rep SubmitSelfServiceVerificationFlowWithLinkMethodBody x)
-> (forall x.
    Rep SubmitSelfServiceVerificationFlowWithLinkMethodBody x
    -> SubmitSelfServiceVerificationFlowWithLinkMethodBody)
-> Generic SubmitSelfServiceVerificationFlowWithLinkMethodBody
forall x.
Rep SubmitSelfServiceVerificationFlowWithLinkMethodBody x
-> SubmitSelfServiceVerificationFlowWithLinkMethodBody
forall x.
SubmitSelfServiceVerificationFlowWithLinkMethodBody
-> Rep SubmitSelfServiceVerificationFlowWithLinkMethodBody x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep SubmitSelfServiceVerificationFlowWithLinkMethodBody x
-> SubmitSelfServiceVerificationFlowWithLinkMethodBody
$cfrom :: forall x.
SubmitSelfServiceVerificationFlowWithLinkMethodBody
-> Rep SubmitSelfServiceVerificationFlowWithLinkMethodBody x
Generic, Typeable SubmitSelfServiceVerificationFlowWithLinkMethodBody
DataType
Constr
Typeable SubmitSelfServiceVerificationFlowWithLinkMethodBody
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g)
    -> SubmitSelfServiceVerificationFlowWithLinkMethodBody
    -> c SubmitSelfServiceVerificationFlowWithLinkMethodBody)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r)
    -> Constr
    -> c SubmitSelfServiceVerificationFlowWithLinkMethodBody)
-> (SubmitSelfServiceVerificationFlowWithLinkMethodBody -> Constr)
-> (SubmitSelfServiceVerificationFlowWithLinkMethodBody
    -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d))
    -> Maybe (c SubmitSelfServiceVerificationFlowWithLinkMethodBody))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e))
    -> Maybe (c SubmitSelfServiceVerificationFlowWithLinkMethodBody))
-> ((forall b. Data b => b -> b)
    -> SubmitSelfServiceVerificationFlowWithLinkMethodBody
    -> SubmitSelfServiceVerificationFlowWithLinkMethodBody)
-> (forall r r'.
    (r -> r' -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SubmitSelfServiceVerificationFlowWithLinkMethodBody
    -> r)
-> (forall r r'.
    (r' -> r -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SubmitSelfServiceVerificationFlowWithLinkMethodBody
    -> r)
-> (forall u.
    (forall d. Data d => d -> u)
    -> SubmitSelfServiceVerificationFlowWithLinkMethodBody -> [u])
-> (forall u.
    Int
    -> (forall d. Data d => d -> u)
    -> SubmitSelfServiceVerificationFlowWithLinkMethodBody
    -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceVerificationFlowWithLinkMethodBody
    -> m SubmitSelfServiceVerificationFlowWithLinkMethodBody)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceVerificationFlowWithLinkMethodBody
    -> m SubmitSelfServiceVerificationFlowWithLinkMethodBody)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SubmitSelfServiceVerificationFlowWithLinkMethodBody
    -> m SubmitSelfServiceVerificationFlowWithLinkMethodBody)
-> Data SubmitSelfServiceVerificationFlowWithLinkMethodBody
SubmitSelfServiceVerificationFlowWithLinkMethodBody -> DataType
SubmitSelfServiceVerificationFlowWithLinkMethodBody -> Constr
(forall b. Data b => b -> b)
-> SubmitSelfServiceVerificationFlowWithLinkMethodBody
-> SubmitSelfServiceVerificationFlowWithLinkMethodBody
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceVerificationFlowWithLinkMethodBody
-> c SubmitSelfServiceVerificationFlowWithLinkMethodBody
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceVerificationFlowWithLinkMethodBody
forall a.
Typeable a
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g) -> a -> c a)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r) -> Constr -> c a)
-> (a -> Constr)
-> (a -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d)) -> Maybe (c a))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c a))
-> ((forall b. Data b => b -> b) -> a -> a)
-> (forall r r'.
    (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall r r'.
    (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall u. (forall d. Data d => d -> u) -> a -> [u])
-> (forall u. Int -> (forall d. Data d => d -> u) -> a -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> Data a
forall u.
Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceVerificationFlowWithLinkMethodBody
-> u
forall u.
(forall d. Data d => d -> u)
-> SubmitSelfServiceVerificationFlowWithLinkMethodBody -> [u]
forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceVerificationFlowWithLinkMethodBody
-> r
forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceVerificationFlowWithLinkMethodBody
-> r
forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceVerificationFlowWithLinkMethodBody
-> m SubmitSelfServiceVerificationFlowWithLinkMethodBody
forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceVerificationFlowWithLinkMethodBody
-> m SubmitSelfServiceVerificationFlowWithLinkMethodBody
forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceVerificationFlowWithLinkMethodBody
forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceVerificationFlowWithLinkMethodBody
-> c SubmitSelfServiceVerificationFlowWithLinkMethodBody
forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceVerificationFlowWithLinkMethodBody)
forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceVerificationFlowWithLinkMethodBody)
$cSubmitSelfServiceVerificationFlowWithLinkMethodBody :: Constr
$tSubmitSelfServiceVerificationFlowWithLinkMethodBody :: DataType
gmapMo :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceVerificationFlowWithLinkMethodBody
-> m SubmitSelfServiceVerificationFlowWithLinkMethodBody
$cgmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceVerificationFlowWithLinkMethodBody
-> m SubmitSelfServiceVerificationFlowWithLinkMethodBody
gmapMp :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceVerificationFlowWithLinkMethodBody
-> m SubmitSelfServiceVerificationFlowWithLinkMethodBody
$cgmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceVerificationFlowWithLinkMethodBody
-> m SubmitSelfServiceVerificationFlowWithLinkMethodBody
gmapM :: (forall d. Data d => d -> m d)
-> SubmitSelfServiceVerificationFlowWithLinkMethodBody
-> m SubmitSelfServiceVerificationFlowWithLinkMethodBody
$cgmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SubmitSelfServiceVerificationFlowWithLinkMethodBody
-> m SubmitSelfServiceVerificationFlowWithLinkMethodBody
gmapQi :: Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceVerificationFlowWithLinkMethodBody
-> u
$cgmapQi :: forall u.
Int
-> (forall d. Data d => d -> u)
-> SubmitSelfServiceVerificationFlowWithLinkMethodBody
-> u
gmapQ :: (forall d. Data d => d -> u)
-> SubmitSelfServiceVerificationFlowWithLinkMethodBody -> [u]
$cgmapQ :: forall u.
(forall d. Data d => d -> u)
-> SubmitSelfServiceVerificationFlowWithLinkMethodBody -> [u]
gmapQr :: (r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceVerificationFlowWithLinkMethodBody
-> r
$cgmapQr :: forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceVerificationFlowWithLinkMethodBody
-> r
gmapQl :: (r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceVerificationFlowWithLinkMethodBody
-> r
$cgmapQl :: forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SubmitSelfServiceVerificationFlowWithLinkMethodBody
-> r
gmapT :: (forall b. Data b => b -> b)
-> SubmitSelfServiceVerificationFlowWithLinkMethodBody
-> SubmitSelfServiceVerificationFlowWithLinkMethodBody
$cgmapT :: (forall b. Data b => b -> b)
-> SubmitSelfServiceVerificationFlowWithLinkMethodBody
-> SubmitSelfServiceVerificationFlowWithLinkMethodBody
dataCast2 :: (forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceVerificationFlowWithLinkMethodBody)
$cdataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SubmitSelfServiceVerificationFlowWithLinkMethodBody)
dataCast1 :: (forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceVerificationFlowWithLinkMethodBody)
$cdataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SubmitSelfServiceVerificationFlowWithLinkMethodBody)
dataTypeOf :: SubmitSelfServiceVerificationFlowWithLinkMethodBody -> DataType
$cdataTypeOf :: SubmitSelfServiceVerificationFlowWithLinkMethodBody -> DataType
toConstr :: SubmitSelfServiceVerificationFlowWithLinkMethodBody -> Constr
$ctoConstr :: SubmitSelfServiceVerificationFlowWithLinkMethodBody -> Constr
gunfold :: (forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceVerificationFlowWithLinkMethodBody
$cgunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SubmitSelfServiceVerificationFlowWithLinkMethodBody
gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceVerificationFlowWithLinkMethodBody
-> c SubmitSelfServiceVerificationFlowWithLinkMethodBody
$cgfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SubmitSelfServiceVerificationFlowWithLinkMethodBody
-> c SubmitSelfServiceVerificationFlowWithLinkMethodBody
$cp1Data :: Typeable SubmitSelfServiceVerificationFlowWithLinkMethodBody
Data)

instance FromJSON SubmitSelfServiceVerificationFlowWithLinkMethodBody

instance ToJSON SubmitSelfServiceVerificationFlowWithLinkMethodBody where
  toEncoding :: SubmitSelfServiceVerificationFlowWithLinkMethodBody -> Encoding
toEncoding = Options
-> SubmitSelfServiceVerificationFlowWithLinkMethodBody -> Encoding
forall a.
(Generic a, GToJSON' Encoding Zero (Rep a)) =>
Options -> a -> Encoding
genericToEncoding Options
defaultOptions