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

module OryKratos.Types.Other
  ( Session (..),
    SettingsProfileFormConfig (..),
    SuccessfulSelfServiceLoginWithoutBrowser (..),
    SuccessfulSelfServiceRegistrationWithoutBrowser (..),
  )
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)
import OryKratos.Types.Identity (Identity)
import OryKratos.Types.Types
  ( AuthenticatorAssuranceLevel,
    SessionAuthenticationMethod,
  )
import OryKratos.Types.Ui (UiNode, UiText)

-- | A Session
data Session = Session
  { -- | Active state. If false the session is no longer active.
    Session -> Maybe Bool
active :: Maybe Bool,
    -- | The Session Authentication Timestamp  When this session was authenticated at. If multi-factor authentication was used this is the time when the last factor was authenticated (e.g. the TOTP code challenge was completed).
    Session -> Maybe UTCTime
authenticated_at :: Maybe UTCTime,
    -- | A list of authenticators which were used to authenticate the session.
    Session -> Maybe [SessionAuthenticationMethod]
authentication_methods :: Maybe [SessionAuthenticationMethod],
    Session -> Maybe AuthenticatorAssuranceLevel
authenticator_assurance_level :: Maybe AuthenticatorAssuranceLevel,
    -- | The Session Expiry  When this session expires at.
    Session -> Maybe UTCTime
expires_at :: Maybe UTCTime,
    Session -> UUID
id :: UUID,
    Session -> Identity
identity :: Identity,
    -- | The Session Issuance Timestamp  When this session was issued at. Usually equal or close to `authenticated_at`.
    Session -> Maybe UTCTime
issued_at :: Maybe UTCTime
  }
  deriving stock (Int -> Session -> ShowS
[Session] -> ShowS
Session -> String
(Int -> Session -> ShowS)
-> (Session -> String) -> ([Session] -> ShowS) -> Show Session
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [Session] -> ShowS
$cshowList :: [Session] -> ShowS
show :: Session -> String
$cshow :: Session -> String
showsPrec :: Int -> Session -> ShowS
$cshowsPrec :: Int -> Session -> ShowS
Show, Session -> Session -> Bool
(Session -> Session -> Bool)
-> (Session -> Session -> Bool) -> Eq Session
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: Session -> Session -> Bool
$c/= :: Session -> Session -> Bool
== :: Session -> Session -> Bool
$c== :: Session -> Session -> Bool
Eq, (forall x. Session -> Rep Session x)
-> (forall x. Rep Session x -> Session) -> Generic Session
forall x. Rep Session x -> Session
forall x. Session -> Rep Session x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep Session x -> Session
$cfrom :: forall x. Session -> Rep Session x
Generic, Typeable Session
DataType
Constr
Typeable Session
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g) -> Session -> c Session)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r) -> Constr -> c Session)
-> (Session -> Constr)
-> (Session -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d)) -> Maybe (c Session))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Session))
-> ((forall b. Data b => b -> b) -> Session -> Session)
-> (forall r r'.
    (r -> r' -> r)
    -> r -> (forall d. Data d => d -> r') -> Session -> r)
-> (forall r r'.
    (r' -> r -> r)
    -> r -> (forall d. Data d => d -> r') -> Session -> r)
-> (forall u. (forall d. Data d => d -> u) -> Session -> [u])
-> (forall u. Int -> (forall d. Data d => d -> u) -> Session -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d) -> Session -> m Session)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> Session -> m Session)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> Session -> m Session)
-> Data Session
Session -> DataType
Session -> Constr
(forall b. Data b => b -> b) -> Session -> Session
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> Session -> c Session
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c Session
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) -> Session -> u
forall u. (forall d. Data d => d -> u) -> Session -> [u]
forall r r'.
(r -> r' -> r)
-> r -> (forall d. Data d => d -> r') -> Session -> r
forall r r'.
(r' -> r -> r)
-> r -> (forall d. Data d => d -> r') -> Session -> r
forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d) -> Session -> m Session
forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> Session -> m Session
forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c Session
forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> Session -> c Session
forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c Session)
forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Session)
$cSession :: Constr
$tSession :: DataType
gmapMo :: (forall d. Data d => d -> m d) -> Session -> m Session
$cgmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> Session -> m Session
gmapMp :: (forall d. Data d => d -> m d) -> Session -> m Session
$cgmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> Session -> m Session
gmapM :: (forall d. Data d => d -> m d) -> Session -> m Session
$cgmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d) -> Session -> m Session
gmapQi :: Int -> (forall d. Data d => d -> u) -> Session -> u
$cgmapQi :: forall u. Int -> (forall d. Data d => d -> u) -> Session -> u
gmapQ :: (forall d. Data d => d -> u) -> Session -> [u]
$cgmapQ :: forall u. (forall d. Data d => d -> u) -> Session -> [u]
gmapQr :: (r' -> r -> r)
-> r -> (forall d. Data d => d -> r') -> Session -> r
$cgmapQr :: forall r r'.
(r' -> r -> r)
-> r -> (forall d. Data d => d -> r') -> Session -> r
gmapQl :: (r -> r' -> r)
-> r -> (forall d. Data d => d -> r') -> Session -> r
$cgmapQl :: forall r r'.
(r -> r' -> r)
-> r -> (forall d. Data d => d -> r') -> Session -> r
gmapT :: (forall b. Data b => b -> b) -> Session -> Session
$cgmapT :: (forall b. Data b => b -> b) -> Session -> Session
dataCast2 :: (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Session)
$cdataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Session)
dataCast1 :: (forall d. Data d => c (t d)) -> Maybe (c Session)
$cdataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c Session)
dataTypeOf :: Session -> DataType
$cdataTypeOf :: Session -> DataType
toConstr :: Session -> Constr
$ctoConstr :: Session -> Constr
gunfold :: (forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c Session
$cgunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c Session
gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> Session -> c Session
$cgfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> Session -> c Session
$cp1Data :: Typeable Session
Data)

instance FromJSON Session

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

data SettingsProfileFormConfig = SettingsProfileFormConfig
  { -- | Action should be used as the form action URL `<form action=\"{{ .Action }}\" method=\"post\">`.
    SettingsProfileFormConfig -> Text
action :: Text,
    SettingsProfileFormConfig -> Maybe [UiText]
messages :: Maybe [UiText],
    -- | Method is the form method (e.g. POST)
    SettingsProfileFormConfig -> Text
method :: Text,
    SettingsProfileFormConfig -> [UiNode]
nodes :: [UiNode]
  }
  deriving stock (Int -> SettingsProfileFormConfig -> ShowS
[SettingsProfileFormConfig] -> ShowS
SettingsProfileFormConfig -> String
(Int -> SettingsProfileFormConfig -> ShowS)
-> (SettingsProfileFormConfig -> String)
-> ([SettingsProfileFormConfig] -> ShowS)
-> Show SettingsProfileFormConfig
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [SettingsProfileFormConfig] -> ShowS
$cshowList :: [SettingsProfileFormConfig] -> ShowS
show :: SettingsProfileFormConfig -> String
$cshow :: SettingsProfileFormConfig -> String
showsPrec :: Int -> SettingsProfileFormConfig -> ShowS
$cshowsPrec :: Int -> SettingsProfileFormConfig -> ShowS
Show, SettingsProfileFormConfig -> SettingsProfileFormConfig -> Bool
(SettingsProfileFormConfig -> SettingsProfileFormConfig -> Bool)
-> (SettingsProfileFormConfig -> SettingsProfileFormConfig -> Bool)
-> Eq SettingsProfileFormConfig
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: SettingsProfileFormConfig -> SettingsProfileFormConfig -> Bool
$c/= :: SettingsProfileFormConfig -> SettingsProfileFormConfig -> Bool
== :: SettingsProfileFormConfig -> SettingsProfileFormConfig -> Bool
$c== :: SettingsProfileFormConfig -> SettingsProfileFormConfig -> Bool
Eq, (forall x.
 SettingsProfileFormConfig -> Rep SettingsProfileFormConfig x)
-> (forall x.
    Rep SettingsProfileFormConfig x -> SettingsProfileFormConfig)
-> Generic SettingsProfileFormConfig
forall x.
Rep SettingsProfileFormConfig x -> SettingsProfileFormConfig
forall x.
SettingsProfileFormConfig -> Rep SettingsProfileFormConfig x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep SettingsProfileFormConfig x -> SettingsProfileFormConfig
$cfrom :: forall x.
SettingsProfileFormConfig -> Rep SettingsProfileFormConfig x
Generic, Typeable SettingsProfileFormConfig
DataType
Constr
Typeable SettingsProfileFormConfig
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g)
    -> SettingsProfileFormConfig
    -> c SettingsProfileFormConfig)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r) -> Constr -> c SettingsProfileFormConfig)
-> (SettingsProfileFormConfig -> Constr)
-> (SettingsProfileFormConfig -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d))
    -> Maybe (c SettingsProfileFormConfig))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e))
    -> Maybe (c SettingsProfileFormConfig))
-> ((forall b. Data b => b -> b)
    -> SettingsProfileFormConfig -> SettingsProfileFormConfig)
-> (forall r r'.
    (r -> r' -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SettingsProfileFormConfig
    -> r)
-> (forall r r'.
    (r' -> r -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SettingsProfileFormConfig
    -> r)
-> (forall u.
    (forall d. Data d => d -> u) -> SettingsProfileFormConfig -> [u])
-> (forall u.
    Int
    -> (forall d. Data d => d -> u) -> SettingsProfileFormConfig -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d)
    -> SettingsProfileFormConfig -> m SettingsProfileFormConfig)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SettingsProfileFormConfig -> m SettingsProfileFormConfig)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SettingsProfileFormConfig -> m SettingsProfileFormConfig)
-> Data SettingsProfileFormConfig
SettingsProfileFormConfig -> DataType
SettingsProfileFormConfig -> Constr
(forall b. Data b => b -> b)
-> SettingsProfileFormConfig -> SettingsProfileFormConfig
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SettingsProfileFormConfig
-> c SettingsProfileFormConfig
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c SettingsProfileFormConfig
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) -> SettingsProfileFormConfig -> u
forall u.
(forall d. Data d => d -> u) -> SettingsProfileFormConfig -> [u]
forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SettingsProfileFormConfig
-> r
forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SettingsProfileFormConfig
-> r
forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SettingsProfileFormConfig -> m SettingsProfileFormConfig
forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SettingsProfileFormConfig -> m SettingsProfileFormConfig
forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c SettingsProfileFormConfig
forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SettingsProfileFormConfig
-> c SettingsProfileFormConfig
forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SettingsProfileFormConfig)
forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SettingsProfileFormConfig)
$cSettingsProfileFormConfig :: Constr
$tSettingsProfileFormConfig :: DataType
gmapMo :: (forall d. Data d => d -> m d)
-> SettingsProfileFormConfig -> m SettingsProfileFormConfig
$cgmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SettingsProfileFormConfig -> m SettingsProfileFormConfig
gmapMp :: (forall d. Data d => d -> m d)
-> SettingsProfileFormConfig -> m SettingsProfileFormConfig
$cgmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SettingsProfileFormConfig -> m SettingsProfileFormConfig
gmapM :: (forall d. Data d => d -> m d)
-> SettingsProfileFormConfig -> m SettingsProfileFormConfig
$cgmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SettingsProfileFormConfig -> m SettingsProfileFormConfig
gmapQi :: Int
-> (forall d. Data d => d -> u) -> SettingsProfileFormConfig -> u
$cgmapQi :: forall u.
Int
-> (forall d. Data d => d -> u) -> SettingsProfileFormConfig -> u
gmapQ :: (forall d. Data d => d -> u) -> SettingsProfileFormConfig -> [u]
$cgmapQ :: forall u.
(forall d. Data d => d -> u) -> SettingsProfileFormConfig -> [u]
gmapQr :: (r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SettingsProfileFormConfig
-> r
$cgmapQr :: forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SettingsProfileFormConfig
-> r
gmapQl :: (r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SettingsProfileFormConfig
-> r
$cgmapQl :: forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SettingsProfileFormConfig
-> r
gmapT :: (forall b. Data b => b -> b)
-> SettingsProfileFormConfig -> SettingsProfileFormConfig
$cgmapT :: (forall b. Data b => b -> b)
-> SettingsProfileFormConfig -> SettingsProfileFormConfig
dataCast2 :: (forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SettingsProfileFormConfig)
$cdataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SettingsProfileFormConfig)
dataCast1 :: (forall d. Data d => c (t d))
-> Maybe (c SettingsProfileFormConfig)
$cdataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SettingsProfileFormConfig)
dataTypeOf :: SettingsProfileFormConfig -> DataType
$cdataTypeOf :: SettingsProfileFormConfig -> DataType
toConstr :: SettingsProfileFormConfig -> Constr
$ctoConstr :: SettingsProfileFormConfig -> Constr
gunfold :: (forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c SettingsProfileFormConfig
$cgunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c SettingsProfileFormConfig
gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SettingsProfileFormConfig
-> c SettingsProfileFormConfig
$cgfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SettingsProfileFormConfig
-> c SettingsProfileFormConfig
$cp1Data :: Typeable SettingsProfileFormConfig
Data)

instance FromJSON SettingsProfileFormConfig

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

-- | The Response for Login Flows via API
data SuccessfulSelfServiceLoginWithoutBrowser = SuccessfulSelfServiceLoginWithoutBrowser
  { SuccessfulSelfServiceLoginWithoutBrowser -> Session
session :: Session,
    -- | The Session Token  A session token is equivalent to a session cookie, but it can be sent in the HTTP Authorization Header:  Authorization: bearer ${session-token}  The session token is only issued for API flows, not for Browser flows!
    SuccessfulSelfServiceLoginWithoutBrowser -> Maybe Text
session_token :: Maybe Text
  }
  deriving stock (Int -> SuccessfulSelfServiceLoginWithoutBrowser -> ShowS
[SuccessfulSelfServiceLoginWithoutBrowser] -> ShowS
SuccessfulSelfServiceLoginWithoutBrowser -> String
(Int -> SuccessfulSelfServiceLoginWithoutBrowser -> ShowS)
-> (SuccessfulSelfServiceLoginWithoutBrowser -> String)
-> ([SuccessfulSelfServiceLoginWithoutBrowser] -> ShowS)
-> Show SuccessfulSelfServiceLoginWithoutBrowser
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [SuccessfulSelfServiceLoginWithoutBrowser] -> ShowS
$cshowList :: [SuccessfulSelfServiceLoginWithoutBrowser] -> ShowS
show :: SuccessfulSelfServiceLoginWithoutBrowser -> String
$cshow :: SuccessfulSelfServiceLoginWithoutBrowser -> String
showsPrec :: Int -> SuccessfulSelfServiceLoginWithoutBrowser -> ShowS
$cshowsPrec :: Int -> SuccessfulSelfServiceLoginWithoutBrowser -> ShowS
Show, SuccessfulSelfServiceLoginWithoutBrowser
-> SuccessfulSelfServiceLoginWithoutBrowser -> Bool
(SuccessfulSelfServiceLoginWithoutBrowser
 -> SuccessfulSelfServiceLoginWithoutBrowser -> Bool)
-> (SuccessfulSelfServiceLoginWithoutBrowser
    -> SuccessfulSelfServiceLoginWithoutBrowser -> Bool)
-> Eq SuccessfulSelfServiceLoginWithoutBrowser
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: SuccessfulSelfServiceLoginWithoutBrowser
-> SuccessfulSelfServiceLoginWithoutBrowser -> Bool
$c/= :: SuccessfulSelfServiceLoginWithoutBrowser
-> SuccessfulSelfServiceLoginWithoutBrowser -> Bool
== :: SuccessfulSelfServiceLoginWithoutBrowser
-> SuccessfulSelfServiceLoginWithoutBrowser -> Bool
$c== :: SuccessfulSelfServiceLoginWithoutBrowser
-> SuccessfulSelfServiceLoginWithoutBrowser -> Bool
Eq, (forall x.
 SuccessfulSelfServiceLoginWithoutBrowser
 -> Rep SuccessfulSelfServiceLoginWithoutBrowser x)
-> (forall x.
    Rep SuccessfulSelfServiceLoginWithoutBrowser x
    -> SuccessfulSelfServiceLoginWithoutBrowser)
-> Generic SuccessfulSelfServiceLoginWithoutBrowser
forall x.
Rep SuccessfulSelfServiceLoginWithoutBrowser x
-> SuccessfulSelfServiceLoginWithoutBrowser
forall x.
SuccessfulSelfServiceLoginWithoutBrowser
-> Rep SuccessfulSelfServiceLoginWithoutBrowser x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep SuccessfulSelfServiceLoginWithoutBrowser x
-> SuccessfulSelfServiceLoginWithoutBrowser
$cfrom :: forall x.
SuccessfulSelfServiceLoginWithoutBrowser
-> Rep SuccessfulSelfServiceLoginWithoutBrowser x
Generic, Typeable SuccessfulSelfServiceLoginWithoutBrowser
DataType
Constr
Typeable SuccessfulSelfServiceLoginWithoutBrowser
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g)
    -> SuccessfulSelfServiceLoginWithoutBrowser
    -> c SuccessfulSelfServiceLoginWithoutBrowser)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r)
    -> Constr
    -> c SuccessfulSelfServiceLoginWithoutBrowser)
-> (SuccessfulSelfServiceLoginWithoutBrowser -> Constr)
-> (SuccessfulSelfServiceLoginWithoutBrowser -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d))
    -> Maybe (c SuccessfulSelfServiceLoginWithoutBrowser))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e))
    -> Maybe (c SuccessfulSelfServiceLoginWithoutBrowser))
-> ((forall b. Data b => b -> b)
    -> SuccessfulSelfServiceLoginWithoutBrowser
    -> SuccessfulSelfServiceLoginWithoutBrowser)
-> (forall r r'.
    (r -> r' -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SuccessfulSelfServiceLoginWithoutBrowser
    -> r)
-> (forall r r'.
    (r' -> r -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SuccessfulSelfServiceLoginWithoutBrowser
    -> r)
-> (forall u.
    (forall d. Data d => d -> u)
    -> SuccessfulSelfServiceLoginWithoutBrowser -> [u])
-> (forall u.
    Int
    -> (forall d. Data d => d -> u)
    -> SuccessfulSelfServiceLoginWithoutBrowser
    -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d)
    -> SuccessfulSelfServiceLoginWithoutBrowser
    -> m SuccessfulSelfServiceLoginWithoutBrowser)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SuccessfulSelfServiceLoginWithoutBrowser
    -> m SuccessfulSelfServiceLoginWithoutBrowser)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SuccessfulSelfServiceLoginWithoutBrowser
    -> m SuccessfulSelfServiceLoginWithoutBrowser)
-> Data SuccessfulSelfServiceLoginWithoutBrowser
SuccessfulSelfServiceLoginWithoutBrowser -> DataType
SuccessfulSelfServiceLoginWithoutBrowser -> Constr
(forall b. Data b => b -> b)
-> SuccessfulSelfServiceLoginWithoutBrowser
-> SuccessfulSelfServiceLoginWithoutBrowser
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SuccessfulSelfServiceLoginWithoutBrowser
-> c SuccessfulSelfServiceLoginWithoutBrowser
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SuccessfulSelfServiceLoginWithoutBrowser
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)
-> SuccessfulSelfServiceLoginWithoutBrowser
-> u
forall u.
(forall d. Data d => d -> u)
-> SuccessfulSelfServiceLoginWithoutBrowser -> [u]
forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SuccessfulSelfServiceLoginWithoutBrowser
-> r
forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SuccessfulSelfServiceLoginWithoutBrowser
-> r
forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SuccessfulSelfServiceLoginWithoutBrowser
-> m SuccessfulSelfServiceLoginWithoutBrowser
forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SuccessfulSelfServiceLoginWithoutBrowser
-> m SuccessfulSelfServiceLoginWithoutBrowser
forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SuccessfulSelfServiceLoginWithoutBrowser
forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SuccessfulSelfServiceLoginWithoutBrowser
-> c SuccessfulSelfServiceLoginWithoutBrowser
forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SuccessfulSelfServiceLoginWithoutBrowser)
forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SuccessfulSelfServiceLoginWithoutBrowser)
$cSuccessfulSelfServiceLoginWithoutBrowser :: Constr
$tSuccessfulSelfServiceLoginWithoutBrowser :: DataType
gmapMo :: (forall d. Data d => d -> m d)
-> SuccessfulSelfServiceLoginWithoutBrowser
-> m SuccessfulSelfServiceLoginWithoutBrowser
$cgmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SuccessfulSelfServiceLoginWithoutBrowser
-> m SuccessfulSelfServiceLoginWithoutBrowser
gmapMp :: (forall d. Data d => d -> m d)
-> SuccessfulSelfServiceLoginWithoutBrowser
-> m SuccessfulSelfServiceLoginWithoutBrowser
$cgmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SuccessfulSelfServiceLoginWithoutBrowser
-> m SuccessfulSelfServiceLoginWithoutBrowser
gmapM :: (forall d. Data d => d -> m d)
-> SuccessfulSelfServiceLoginWithoutBrowser
-> m SuccessfulSelfServiceLoginWithoutBrowser
$cgmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SuccessfulSelfServiceLoginWithoutBrowser
-> m SuccessfulSelfServiceLoginWithoutBrowser
gmapQi :: Int
-> (forall d. Data d => d -> u)
-> SuccessfulSelfServiceLoginWithoutBrowser
-> u
$cgmapQi :: forall u.
Int
-> (forall d. Data d => d -> u)
-> SuccessfulSelfServiceLoginWithoutBrowser
-> u
gmapQ :: (forall d. Data d => d -> u)
-> SuccessfulSelfServiceLoginWithoutBrowser -> [u]
$cgmapQ :: forall u.
(forall d. Data d => d -> u)
-> SuccessfulSelfServiceLoginWithoutBrowser -> [u]
gmapQr :: (r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SuccessfulSelfServiceLoginWithoutBrowser
-> r
$cgmapQr :: forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SuccessfulSelfServiceLoginWithoutBrowser
-> r
gmapQl :: (r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SuccessfulSelfServiceLoginWithoutBrowser
-> r
$cgmapQl :: forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SuccessfulSelfServiceLoginWithoutBrowser
-> r
gmapT :: (forall b. Data b => b -> b)
-> SuccessfulSelfServiceLoginWithoutBrowser
-> SuccessfulSelfServiceLoginWithoutBrowser
$cgmapT :: (forall b. Data b => b -> b)
-> SuccessfulSelfServiceLoginWithoutBrowser
-> SuccessfulSelfServiceLoginWithoutBrowser
dataCast2 :: (forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SuccessfulSelfServiceLoginWithoutBrowser)
$cdataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SuccessfulSelfServiceLoginWithoutBrowser)
dataCast1 :: (forall d. Data d => c (t d))
-> Maybe (c SuccessfulSelfServiceLoginWithoutBrowser)
$cdataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SuccessfulSelfServiceLoginWithoutBrowser)
dataTypeOf :: SuccessfulSelfServiceLoginWithoutBrowser -> DataType
$cdataTypeOf :: SuccessfulSelfServiceLoginWithoutBrowser -> DataType
toConstr :: SuccessfulSelfServiceLoginWithoutBrowser -> Constr
$ctoConstr :: SuccessfulSelfServiceLoginWithoutBrowser -> Constr
gunfold :: (forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SuccessfulSelfServiceLoginWithoutBrowser
$cgunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SuccessfulSelfServiceLoginWithoutBrowser
gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SuccessfulSelfServiceLoginWithoutBrowser
-> c SuccessfulSelfServiceLoginWithoutBrowser
$cgfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SuccessfulSelfServiceLoginWithoutBrowser
-> c SuccessfulSelfServiceLoginWithoutBrowser
$cp1Data :: Typeable SuccessfulSelfServiceLoginWithoutBrowser
Data)

instance FromJSON SuccessfulSelfServiceLoginWithoutBrowser

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

-- | The Response for Registration Flows via API
data SuccessfulSelfServiceRegistrationWithoutBrowser = SuccessfulSelfServiceRegistrationWithoutBrowser
  { SuccessfulSelfServiceRegistrationWithoutBrowser -> Identity
identity :: Identity,
    SuccessfulSelfServiceRegistrationWithoutBrowser -> Maybe Session
session :: Maybe Session,
    -- | The Session Token  This field is only set when the session hook is configured as a post-registration hook.  A session token is equivalent to a session cookie, but it can be sent in the HTTP Authorization Header:  Authorization: bearer ${session-token}  The session token is only issued for API flows, not for Browser flows!
    SuccessfulSelfServiceRegistrationWithoutBrowser -> Maybe Text
session_token :: Maybe Text
  }
  deriving stock (Int -> SuccessfulSelfServiceRegistrationWithoutBrowser -> ShowS
[SuccessfulSelfServiceRegistrationWithoutBrowser] -> ShowS
SuccessfulSelfServiceRegistrationWithoutBrowser -> String
(Int -> SuccessfulSelfServiceRegistrationWithoutBrowser -> ShowS)
-> (SuccessfulSelfServiceRegistrationWithoutBrowser -> String)
-> ([SuccessfulSelfServiceRegistrationWithoutBrowser] -> ShowS)
-> Show SuccessfulSelfServiceRegistrationWithoutBrowser
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [SuccessfulSelfServiceRegistrationWithoutBrowser] -> ShowS
$cshowList :: [SuccessfulSelfServiceRegistrationWithoutBrowser] -> ShowS
show :: SuccessfulSelfServiceRegistrationWithoutBrowser -> String
$cshow :: SuccessfulSelfServiceRegistrationWithoutBrowser -> String
showsPrec :: Int -> SuccessfulSelfServiceRegistrationWithoutBrowser -> ShowS
$cshowsPrec :: Int -> SuccessfulSelfServiceRegistrationWithoutBrowser -> ShowS
Show, SuccessfulSelfServiceRegistrationWithoutBrowser
-> SuccessfulSelfServiceRegistrationWithoutBrowser -> Bool
(SuccessfulSelfServiceRegistrationWithoutBrowser
 -> SuccessfulSelfServiceRegistrationWithoutBrowser -> Bool)
-> (SuccessfulSelfServiceRegistrationWithoutBrowser
    -> SuccessfulSelfServiceRegistrationWithoutBrowser -> Bool)
-> Eq SuccessfulSelfServiceRegistrationWithoutBrowser
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: SuccessfulSelfServiceRegistrationWithoutBrowser
-> SuccessfulSelfServiceRegistrationWithoutBrowser -> Bool
$c/= :: SuccessfulSelfServiceRegistrationWithoutBrowser
-> SuccessfulSelfServiceRegistrationWithoutBrowser -> Bool
== :: SuccessfulSelfServiceRegistrationWithoutBrowser
-> SuccessfulSelfServiceRegistrationWithoutBrowser -> Bool
$c== :: SuccessfulSelfServiceRegistrationWithoutBrowser
-> SuccessfulSelfServiceRegistrationWithoutBrowser -> Bool
Eq, (forall x.
 SuccessfulSelfServiceRegistrationWithoutBrowser
 -> Rep SuccessfulSelfServiceRegistrationWithoutBrowser x)
-> (forall x.
    Rep SuccessfulSelfServiceRegistrationWithoutBrowser x
    -> SuccessfulSelfServiceRegistrationWithoutBrowser)
-> Generic SuccessfulSelfServiceRegistrationWithoutBrowser
forall x.
Rep SuccessfulSelfServiceRegistrationWithoutBrowser x
-> SuccessfulSelfServiceRegistrationWithoutBrowser
forall x.
SuccessfulSelfServiceRegistrationWithoutBrowser
-> Rep SuccessfulSelfServiceRegistrationWithoutBrowser x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep SuccessfulSelfServiceRegistrationWithoutBrowser x
-> SuccessfulSelfServiceRegistrationWithoutBrowser
$cfrom :: forall x.
SuccessfulSelfServiceRegistrationWithoutBrowser
-> Rep SuccessfulSelfServiceRegistrationWithoutBrowser x
Generic, Typeable SuccessfulSelfServiceRegistrationWithoutBrowser
DataType
Constr
Typeable SuccessfulSelfServiceRegistrationWithoutBrowser
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g)
    -> SuccessfulSelfServiceRegistrationWithoutBrowser
    -> c SuccessfulSelfServiceRegistrationWithoutBrowser)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r)
    -> Constr
    -> c SuccessfulSelfServiceRegistrationWithoutBrowser)
-> (SuccessfulSelfServiceRegistrationWithoutBrowser -> Constr)
-> (SuccessfulSelfServiceRegistrationWithoutBrowser -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d))
    -> Maybe (c SuccessfulSelfServiceRegistrationWithoutBrowser))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e))
    -> Maybe (c SuccessfulSelfServiceRegistrationWithoutBrowser))
-> ((forall b. Data b => b -> b)
    -> SuccessfulSelfServiceRegistrationWithoutBrowser
    -> SuccessfulSelfServiceRegistrationWithoutBrowser)
-> (forall r r'.
    (r -> r' -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SuccessfulSelfServiceRegistrationWithoutBrowser
    -> r)
-> (forall r r'.
    (r' -> r -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> SuccessfulSelfServiceRegistrationWithoutBrowser
    -> r)
-> (forall u.
    (forall d. Data d => d -> u)
    -> SuccessfulSelfServiceRegistrationWithoutBrowser -> [u])
-> (forall u.
    Int
    -> (forall d. Data d => d -> u)
    -> SuccessfulSelfServiceRegistrationWithoutBrowser
    -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d)
    -> SuccessfulSelfServiceRegistrationWithoutBrowser
    -> m SuccessfulSelfServiceRegistrationWithoutBrowser)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SuccessfulSelfServiceRegistrationWithoutBrowser
    -> m SuccessfulSelfServiceRegistrationWithoutBrowser)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> SuccessfulSelfServiceRegistrationWithoutBrowser
    -> m SuccessfulSelfServiceRegistrationWithoutBrowser)
-> Data SuccessfulSelfServiceRegistrationWithoutBrowser
SuccessfulSelfServiceRegistrationWithoutBrowser -> DataType
SuccessfulSelfServiceRegistrationWithoutBrowser -> Constr
(forall b. Data b => b -> b)
-> SuccessfulSelfServiceRegistrationWithoutBrowser
-> SuccessfulSelfServiceRegistrationWithoutBrowser
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SuccessfulSelfServiceRegistrationWithoutBrowser
-> c SuccessfulSelfServiceRegistrationWithoutBrowser
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SuccessfulSelfServiceRegistrationWithoutBrowser
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)
-> SuccessfulSelfServiceRegistrationWithoutBrowser
-> u
forall u.
(forall d. Data d => d -> u)
-> SuccessfulSelfServiceRegistrationWithoutBrowser -> [u]
forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SuccessfulSelfServiceRegistrationWithoutBrowser
-> r
forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SuccessfulSelfServiceRegistrationWithoutBrowser
-> r
forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SuccessfulSelfServiceRegistrationWithoutBrowser
-> m SuccessfulSelfServiceRegistrationWithoutBrowser
forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SuccessfulSelfServiceRegistrationWithoutBrowser
-> m SuccessfulSelfServiceRegistrationWithoutBrowser
forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SuccessfulSelfServiceRegistrationWithoutBrowser
forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SuccessfulSelfServiceRegistrationWithoutBrowser
-> c SuccessfulSelfServiceRegistrationWithoutBrowser
forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SuccessfulSelfServiceRegistrationWithoutBrowser)
forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SuccessfulSelfServiceRegistrationWithoutBrowser)
$cSuccessfulSelfServiceRegistrationWithoutBrowser :: Constr
$tSuccessfulSelfServiceRegistrationWithoutBrowser :: DataType
gmapMo :: (forall d. Data d => d -> m d)
-> SuccessfulSelfServiceRegistrationWithoutBrowser
-> m SuccessfulSelfServiceRegistrationWithoutBrowser
$cgmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SuccessfulSelfServiceRegistrationWithoutBrowser
-> m SuccessfulSelfServiceRegistrationWithoutBrowser
gmapMp :: (forall d. Data d => d -> m d)
-> SuccessfulSelfServiceRegistrationWithoutBrowser
-> m SuccessfulSelfServiceRegistrationWithoutBrowser
$cgmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> SuccessfulSelfServiceRegistrationWithoutBrowser
-> m SuccessfulSelfServiceRegistrationWithoutBrowser
gmapM :: (forall d. Data d => d -> m d)
-> SuccessfulSelfServiceRegistrationWithoutBrowser
-> m SuccessfulSelfServiceRegistrationWithoutBrowser
$cgmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> SuccessfulSelfServiceRegistrationWithoutBrowser
-> m SuccessfulSelfServiceRegistrationWithoutBrowser
gmapQi :: Int
-> (forall d. Data d => d -> u)
-> SuccessfulSelfServiceRegistrationWithoutBrowser
-> u
$cgmapQi :: forall u.
Int
-> (forall d. Data d => d -> u)
-> SuccessfulSelfServiceRegistrationWithoutBrowser
-> u
gmapQ :: (forall d. Data d => d -> u)
-> SuccessfulSelfServiceRegistrationWithoutBrowser -> [u]
$cgmapQ :: forall u.
(forall d. Data d => d -> u)
-> SuccessfulSelfServiceRegistrationWithoutBrowser -> [u]
gmapQr :: (r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SuccessfulSelfServiceRegistrationWithoutBrowser
-> r
$cgmapQr :: forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> SuccessfulSelfServiceRegistrationWithoutBrowser
-> r
gmapQl :: (r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SuccessfulSelfServiceRegistrationWithoutBrowser
-> r
$cgmapQl :: forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> SuccessfulSelfServiceRegistrationWithoutBrowser
-> r
gmapT :: (forall b. Data b => b -> b)
-> SuccessfulSelfServiceRegistrationWithoutBrowser
-> SuccessfulSelfServiceRegistrationWithoutBrowser
$cgmapT :: (forall b. Data b => b -> b)
-> SuccessfulSelfServiceRegistrationWithoutBrowser
-> SuccessfulSelfServiceRegistrationWithoutBrowser
dataCast2 :: (forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SuccessfulSelfServiceRegistrationWithoutBrowser)
$cdataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c SuccessfulSelfServiceRegistrationWithoutBrowser)
dataCast1 :: (forall d. Data d => c (t d))
-> Maybe (c SuccessfulSelfServiceRegistrationWithoutBrowser)
$cdataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d))
-> Maybe (c SuccessfulSelfServiceRegistrationWithoutBrowser)
dataTypeOf :: SuccessfulSelfServiceRegistrationWithoutBrowser -> DataType
$cdataTypeOf :: SuccessfulSelfServiceRegistrationWithoutBrowser -> DataType
toConstr :: SuccessfulSelfServiceRegistrationWithoutBrowser -> Constr
$ctoConstr :: SuccessfulSelfServiceRegistrationWithoutBrowser -> Constr
gunfold :: (forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SuccessfulSelfServiceRegistrationWithoutBrowser
$cgunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r)
-> Constr
-> c SuccessfulSelfServiceRegistrationWithoutBrowser
gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SuccessfulSelfServiceRegistrationWithoutBrowser
-> c SuccessfulSelfServiceRegistrationWithoutBrowser
$cgfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> SuccessfulSelfServiceRegistrationWithoutBrowser
-> c SuccessfulSelfServiceRegistrationWithoutBrowser
$cp1Data :: Typeable SuccessfulSelfServiceRegistrationWithoutBrowser
Data)

instance FromJSON SuccessfulSelfServiceRegistrationWithoutBrowser

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