{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE DuplicateRecordFields #-}
{-# LANGUAGE NamedFieldPuns #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE RecordWildCards #-}
{-# LANGUAGE StrictData #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
{-# OPTIONS_GHC -fno-warn-unused-matches #-}

-- Derived from AWS service descriptions, licensed under Apache 2.0.

-- |
-- Module      : Amazonka.WorkSpaces.Types.IosClientBrandingAttributes
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
module Amazonka.WorkSpaces.Types.IosClientBrandingAttributes where

import qualified Amazonka.Core as Core
import qualified Amazonka.Core.Lens.Internal as Lens
import qualified Amazonka.Data as Data
import qualified Amazonka.Prelude as Prelude

-- | The client branding attributes for iOS device types. These attributes
-- are displayed on the iOS client login screen only.
--
-- Client branding attributes are public facing. Ensure you do not include
-- sensitive information.
--
-- /See:/ 'newIosClientBrandingAttributes' smart constructor.
data IosClientBrandingAttributes = IosClientBrandingAttributes'
  { -- | The forgotten password link. This is the web address that users can go
    -- to if they forget the password for their WorkSpace.
    IosClientBrandingAttributes -> Maybe Text
forgotPasswordLink :: Prelude.Maybe Prelude.Text,
    -- | The login message. Specified as a key value pair, in which the key is a
    -- locale and the value is the localized message for that locale. The only
    -- key supported is @en_US@. The HTML tags supported include the following:
    -- @a, b, blockquote, br, cite, code, dd, dl, dt, div, em, i, li, ol, p, pre, q, small, span, strike, strong, sub, sup, u, ul@.
    IosClientBrandingAttributes -> Maybe (HashMap Text Text)
loginMessage :: Prelude.Maybe (Prelude.HashMap Prelude.Text Prelude.Text),
    -- | The \@2x version of the logo. This is the higher resolution display that
    -- offers a scale factor of 2.0 (or \@2x). The only image format accepted
    -- is a binary data object that is converted from a @.png@ file.
    --
    -- For more information about iOS image size and resolution, see
    -- <https://developer.apple.com/design/human-interface-guidelines/ios/icons-and-images/image-size-and-resolution/ Image Size and Resolution>
    -- in the /Apple Human Interface Guidelines/.
    IosClientBrandingAttributes -> Maybe Text
logo2xUrl :: Prelude.Maybe Prelude.Text,
    -- | The \@3x version of the logo. This is the higher resolution display that
    -- offers a scale factor of 3.0 (or \@3x).The only image format accepted is
    -- a binary data object that is converted from a @.png@ file.
    --
    -- For more information about iOS image size and resolution, see
    -- <https://developer.apple.com/design/human-interface-guidelines/ios/icons-and-images/image-size-and-resolution/ Image Size and Resolution>
    -- in the /Apple Human Interface Guidelines/.
    IosClientBrandingAttributes -> Maybe Text
logo3xUrl :: Prelude.Maybe Prelude.Text,
    -- | The logo. This is the standard-resolution display that has a 1:1 pixel
    -- density (or \@1x), where one pixel is equal to one point. The only image
    -- format accepted is a binary data object that is converted from a @.png@
    -- file.
    IosClientBrandingAttributes -> Maybe Text
logoUrl :: Prelude.Maybe Prelude.Text,
    -- | The support email. The company\'s customer support email address.
    --
    -- -   In each platform type, the @SupportEmail@ and @SupportLink@
    --     parameters are mutually exclusive. You can specify one parameter for
    --     each platform type, but not both.
    --
    -- -   The default email is @workspaces-feedback\@amazon.com@.
    IosClientBrandingAttributes -> Maybe Text
supportEmail :: Prelude.Maybe Prelude.Text,
    -- | The support link. The link for the company\'s customer support page for
    -- their WorkSpace.
    --
    -- -   In each platform type, the @SupportEmail@ and @SupportLink@
    --     parameters are mutually exclusive. You can specify one parameter for
    --     each platform type, but not both.
    --
    -- -   The default support link is @workspaces-feedback\@amazon.com@.
    IosClientBrandingAttributes -> Maybe Text
supportLink :: Prelude.Maybe Prelude.Text
  }
  deriving (IosClientBrandingAttributes -> IosClientBrandingAttributes -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: IosClientBrandingAttributes -> IosClientBrandingAttributes -> Bool
$c/= :: IosClientBrandingAttributes -> IosClientBrandingAttributes -> Bool
== :: IosClientBrandingAttributes -> IosClientBrandingAttributes -> Bool
$c== :: IosClientBrandingAttributes -> IosClientBrandingAttributes -> Bool
Prelude.Eq, ReadPrec [IosClientBrandingAttributes]
ReadPrec IosClientBrandingAttributes
Int -> ReadS IosClientBrandingAttributes
ReadS [IosClientBrandingAttributes]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [IosClientBrandingAttributes]
$creadListPrec :: ReadPrec [IosClientBrandingAttributes]
readPrec :: ReadPrec IosClientBrandingAttributes
$creadPrec :: ReadPrec IosClientBrandingAttributes
readList :: ReadS [IosClientBrandingAttributes]
$creadList :: ReadS [IosClientBrandingAttributes]
readsPrec :: Int -> ReadS IosClientBrandingAttributes
$creadsPrec :: Int -> ReadS IosClientBrandingAttributes
Prelude.Read, Int -> IosClientBrandingAttributes -> ShowS
[IosClientBrandingAttributes] -> ShowS
IosClientBrandingAttributes -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [IosClientBrandingAttributes] -> ShowS
$cshowList :: [IosClientBrandingAttributes] -> ShowS
show :: IosClientBrandingAttributes -> String
$cshow :: IosClientBrandingAttributes -> String
showsPrec :: Int -> IosClientBrandingAttributes -> ShowS
$cshowsPrec :: Int -> IosClientBrandingAttributes -> ShowS
Prelude.Show, forall x.
Rep IosClientBrandingAttributes x -> IosClientBrandingAttributes
forall x.
IosClientBrandingAttributes -> Rep IosClientBrandingAttributes x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep IosClientBrandingAttributes x -> IosClientBrandingAttributes
$cfrom :: forall x.
IosClientBrandingAttributes -> Rep IosClientBrandingAttributes x
Prelude.Generic)

-- |
-- Create a value of 'IosClientBrandingAttributes' with all optional fields omitted.
--
-- Use <https://hackage.haskell.org/package/generic-lens generic-lens> or <https://hackage.haskell.org/package/optics optics> to modify other optional fields.
--
-- The following record fields are available, with the corresponding lenses provided
-- for backwards compatibility:
--
-- 'forgotPasswordLink', 'iosClientBrandingAttributes_forgotPasswordLink' - The forgotten password link. This is the web address that users can go
-- to if they forget the password for their WorkSpace.
--
-- 'loginMessage', 'iosClientBrandingAttributes_loginMessage' - The login message. Specified as a key value pair, in which the key is a
-- locale and the value is the localized message for that locale. The only
-- key supported is @en_US@. The HTML tags supported include the following:
-- @a, b, blockquote, br, cite, code, dd, dl, dt, div, em, i, li, ol, p, pre, q, small, span, strike, strong, sub, sup, u, ul@.
--
-- 'logo2xUrl', 'iosClientBrandingAttributes_logo2xUrl' - The \@2x version of the logo. This is the higher resolution display that
-- offers a scale factor of 2.0 (or \@2x). The only image format accepted
-- is a binary data object that is converted from a @.png@ file.
--
-- For more information about iOS image size and resolution, see
-- <https://developer.apple.com/design/human-interface-guidelines/ios/icons-and-images/image-size-and-resolution/ Image Size and Resolution>
-- in the /Apple Human Interface Guidelines/.
--
-- 'logo3xUrl', 'iosClientBrandingAttributes_logo3xUrl' - The \@3x version of the logo. This is the higher resolution display that
-- offers a scale factor of 3.0 (or \@3x).The only image format accepted is
-- a binary data object that is converted from a @.png@ file.
--
-- For more information about iOS image size and resolution, see
-- <https://developer.apple.com/design/human-interface-guidelines/ios/icons-and-images/image-size-and-resolution/ Image Size and Resolution>
-- in the /Apple Human Interface Guidelines/.
--
-- 'logoUrl', 'iosClientBrandingAttributes_logoUrl' - The logo. This is the standard-resolution display that has a 1:1 pixel
-- density (or \@1x), where one pixel is equal to one point. The only image
-- format accepted is a binary data object that is converted from a @.png@
-- file.
--
-- 'supportEmail', 'iosClientBrandingAttributes_supportEmail' - The support email. The company\'s customer support email address.
--
-- -   In each platform type, the @SupportEmail@ and @SupportLink@
--     parameters are mutually exclusive. You can specify one parameter for
--     each platform type, but not both.
--
-- -   The default email is @workspaces-feedback\@amazon.com@.
--
-- 'supportLink', 'iosClientBrandingAttributes_supportLink' - The support link. The link for the company\'s customer support page for
-- their WorkSpace.
--
-- -   In each platform type, the @SupportEmail@ and @SupportLink@
--     parameters are mutually exclusive. You can specify one parameter for
--     each platform type, but not both.
--
-- -   The default support link is @workspaces-feedback\@amazon.com@.
newIosClientBrandingAttributes ::
  IosClientBrandingAttributes
newIosClientBrandingAttributes :: IosClientBrandingAttributes
newIosClientBrandingAttributes =
  IosClientBrandingAttributes'
    { $sel:forgotPasswordLink:IosClientBrandingAttributes' :: Maybe Text
forgotPasswordLink =
        forall a. Maybe a
Prelude.Nothing,
      $sel:loginMessage:IosClientBrandingAttributes' :: Maybe (HashMap Text Text)
loginMessage = forall a. Maybe a
Prelude.Nothing,
      $sel:logo2xUrl:IosClientBrandingAttributes' :: Maybe Text
logo2xUrl = forall a. Maybe a
Prelude.Nothing,
      $sel:logo3xUrl:IosClientBrandingAttributes' :: Maybe Text
logo3xUrl = forall a. Maybe a
Prelude.Nothing,
      $sel:logoUrl:IosClientBrandingAttributes' :: Maybe Text
logoUrl = forall a. Maybe a
Prelude.Nothing,
      $sel:supportEmail:IosClientBrandingAttributes' :: Maybe Text
supportEmail = forall a. Maybe a
Prelude.Nothing,
      $sel:supportLink:IosClientBrandingAttributes' :: Maybe Text
supportLink = forall a. Maybe a
Prelude.Nothing
    }

-- | The forgotten password link. This is the web address that users can go
-- to if they forget the password for their WorkSpace.
iosClientBrandingAttributes_forgotPasswordLink :: Lens.Lens' IosClientBrandingAttributes (Prelude.Maybe Prelude.Text)
iosClientBrandingAttributes_forgotPasswordLink :: Lens' IosClientBrandingAttributes (Maybe Text)
iosClientBrandingAttributes_forgotPasswordLink = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\IosClientBrandingAttributes' {Maybe Text
forgotPasswordLink :: Maybe Text
$sel:forgotPasswordLink:IosClientBrandingAttributes' :: IosClientBrandingAttributes -> Maybe Text
forgotPasswordLink} -> Maybe Text
forgotPasswordLink) (\s :: IosClientBrandingAttributes
s@IosClientBrandingAttributes' {} Maybe Text
a -> IosClientBrandingAttributes
s {$sel:forgotPasswordLink:IosClientBrandingAttributes' :: Maybe Text
forgotPasswordLink = Maybe Text
a} :: IosClientBrandingAttributes)

-- | The login message. Specified as a key value pair, in which the key is a
-- locale and the value is the localized message for that locale. The only
-- key supported is @en_US@. The HTML tags supported include the following:
-- @a, b, blockquote, br, cite, code, dd, dl, dt, div, em, i, li, ol, p, pre, q, small, span, strike, strong, sub, sup, u, ul@.
iosClientBrandingAttributes_loginMessage :: Lens.Lens' IosClientBrandingAttributes (Prelude.Maybe (Prelude.HashMap Prelude.Text Prelude.Text))
iosClientBrandingAttributes_loginMessage :: Lens' IosClientBrandingAttributes (Maybe (HashMap Text Text))
iosClientBrandingAttributes_loginMessage = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\IosClientBrandingAttributes' {Maybe (HashMap Text Text)
loginMessage :: Maybe (HashMap Text Text)
$sel:loginMessage:IosClientBrandingAttributes' :: IosClientBrandingAttributes -> Maybe (HashMap Text Text)
loginMessage} -> Maybe (HashMap Text Text)
loginMessage) (\s :: IosClientBrandingAttributes
s@IosClientBrandingAttributes' {} Maybe (HashMap Text Text)
a -> IosClientBrandingAttributes
s {$sel:loginMessage:IosClientBrandingAttributes' :: Maybe (HashMap Text Text)
loginMessage = Maybe (HashMap Text Text)
a} :: IosClientBrandingAttributes) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping forall s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced

-- | The \@2x version of the logo. This is the higher resolution display that
-- offers a scale factor of 2.0 (or \@2x). The only image format accepted
-- is a binary data object that is converted from a @.png@ file.
--
-- For more information about iOS image size and resolution, see
-- <https://developer.apple.com/design/human-interface-guidelines/ios/icons-and-images/image-size-and-resolution/ Image Size and Resolution>
-- in the /Apple Human Interface Guidelines/.
iosClientBrandingAttributes_logo2xUrl :: Lens.Lens' IosClientBrandingAttributes (Prelude.Maybe Prelude.Text)
iosClientBrandingAttributes_logo2xUrl :: Lens' IosClientBrandingAttributes (Maybe Text)
iosClientBrandingAttributes_logo2xUrl = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\IosClientBrandingAttributes' {Maybe Text
logo2xUrl :: Maybe Text
$sel:logo2xUrl:IosClientBrandingAttributes' :: IosClientBrandingAttributes -> Maybe Text
logo2xUrl} -> Maybe Text
logo2xUrl) (\s :: IosClientBrandingAttributes
s@IosClientBrandingAttributes' {} Maybe Text
a -> IosClientBrandingAttributes
s {$sel:logo2xUrl:IosClientBrandingAttributes' :: Maybe Text
logo2xUrl = Maybe Text
a} :: IosClientBrandingAttributes)

-- | The \@3x version of the logo. This is the higher resolution display that
-- offers a scale factor of 3.0 (or \@3x).The only image format accepted is
-- a binary data object that is converted from a @.png@ file.
--
-- For more information about iOS image size and resolution, see
-- <https://developer.apple.com/design/human-interface-guidelines/ios/icons-and-images/image-size-and-resolution/ Image Size and Resolution>
-- in the /Apple Human Interface Guidelines/.
iosClientBrandingAttributes_logo3xUrl :: Lens.Lens' IosClientBrandingAttributes (Prelude.Maybe Prelude.Text)
iosClientBrandingAttributes_logo3xUrl :: Lens' IosClientBrandingAttributes (Maybe Text)
iosClientBrandingAttributes_logo3xUrl = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\IosClientBrandingAttributes' {Maybe Text
logo3xUrl :: Maybe Text
$sel:logo3xUrl:IosClientBrandingAttributes' :: IosClientBrandingAttributes -> Maybe Text
logo3xUrl} -> Maybe Text
logo3xUrl) (\s :: IosClientBrandingAttributes
s@IosClientBrandingAttributes' {} Maybe Text
a -> IosClientBrandingAttributes
s {$sel:logo3xUrl:IosClientBrandingAttributes' :: Maybe Text
logo3xUrl = Maybe Text
a} :: IosClientBrandingAttributes)

-- | The logo. This is the standard-resolution display that has a 1:1 pixel
-- density (or \@1x), where one pixel is equal to one point. The only image
-- format accepted is a binary data object that is converted from a @.png@
-- file.
iosClientBrandingAttributes_logoUrl :: Lens.Lens' IosClientBrandingAttributes (Prelude.Maybe Prelude.Text)
iosClientBrandingAttributes_logoUrl :: Lens' IosClientBrandingAttributes (Maybe Text)
iosClientBrandingAttributes_logoUrl = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\IosClientBrandingAttributes' {Maybe Text
logoUrl :: Maybe Text
$sel:logoUrl:IosClientBrandingAttributes' :: IosClientBrandingAttributes -> Maybe Text
logoUrl} -> Maybe Text
logoUrl) (\s :: IosClientBrandingAttributes
s@IosClientBrandingAttributes' {} Maybe Text
a -> IosClientBrandingAttributes
s {$sel:logoUrl:IosClientBrandingAttributes' :: Maybe Text
logoUrl = Maybe Text
a} :: IosClientBrandingAttributes)

-- | The support email. The company\'s customer support email address.
--
-- -   In each platform type, the @SupportEmail@ and @SupportLink@
--     parameters are mutually exclusive. You can specify one parameter for
--     each platform type, but not both.
--
-- -   The default email is @workspaces-feedback\@amazon.com@.
iosClientBrandingAttributes_supportEmail :: Lens.Lens' IosClientBrandingAttributes (Prelude.Maybe Prelude.Text)
iosClientBrandingAttributes_supportEmail :: Lens' IosClientBrandingAttributes (Maybe Text)
iosClientBrandingAttributes_supportEmail = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\IosClientBrandingAttributes' {Maybe Text
supportEmail :: Maybe Text
$sel:supportEmail:IosClientBrandingAttributes' :: IosClientBrandingAttributes -> Maybe Text
supportEmail} -> Maybe Text
supportEmail) (\s :: IosClientBrandingAttributes
s@IosClientBrandingAttributes' {} Maybe Text
a -> IosClientBrandingAttributes
s {$sel:supportEmail:IosClientBrandingAttributes' :: Maybe Text
supportEmail = Maybe Text
a} :: IosClientBrandingAttributes)

-- | The support link. The link for the company\'s customer support page for
-- their WorkSpace.
--
-- -   In each platform type, the @SupportEmail@ and @SupportLink@
--     parameters are mutually exclusive. You can specify one parameter for
--     each platform type, but not both.
--
-- -   The default support link is @workspaces-feedback\@amazon.com@.
iosClientBrandingAttributes_supportLink :: Lens.Lens' IosClientBrandingAttributes (Prelude.Maybe Prelude.Text)
iosClientBrandingAttributes_supportLink :: Lens' IosClientBrandingAttributes (Maybe Text)
iosClientBrandingAttributes_supportLink = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\IosClientBrandingAttributes' {Maybe Text
supportLink :: Maybe Text
$sel:supportLink:IosClientBrandingAttributes' :: IosClientBrandingAttributes -> Maybe Text
supportLink} -> Maybe Text
supportLink) (\s :: IosClientBrandingAttributes
s@IosClientBrandingAttributes' {} Maybe Text
a -> IosClientBrandingAttributes
s {$sel:supportLink:IosClientBrandingAttributes' :: Maybe Text
supportLink = Maybe Text
a} :: IosClientBrandingAttributes)

instance Data.FromJSON IosClientBrandingAttributes where
  parseJSON :: Value -> Parser IosClientBrandingAttributes
parseJSON =
    forall a. String -> (Object -> Parser a) -> Value -> Parser a
Data.withObject
      String
"IosClientBrandingAttributes"
      ( \Object
x ->
          Maybe Text
-> Maybe (HashMap Text Text)
-> Maybe Text
-> Maybe Text
-> Maybe Text
-> Maybe Text
-> Maybe Text
-> IosClientBrandingAttributes
IosClientBrandingAttributes'
            forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"ForgotPasswordLink")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"LoginMessage" forall a. Parser (Maybe a) -> a -> Parser a
Data..!= forall a. Monoid a => a
Prelude.mempty)
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"Logo2xUrl")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"Logo3xUrl")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"LogoUrl")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"SupportEmail")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"SupportLink")
      )

instance Prelude.Hashable IosClientBrandingAttributes where
  hashWithSalt :: Int -> IosClientBrandingAttributes -> Int
hashWithSalt Int
_salt IosClientBrandingAttributes' {Maybe Text
Maybe (HashMap Text Text)
supportLink :: Maybe Text
supportEmail :: Maybe Text
logoUrl :: Maybe Text
logo3xUrl :: Maybe Text
logo2xUrl :: Maybe Text
loginMessage :: Maybe (HashMap Text Text)
forgotPasswordLink :: Maybe Text
$sel:supportLink:IosClientBrandingAttributes' :: IosClientBrandingAttributes -> Maybe Text
$sel:supportEmail:IosClientBrandingAttributes' :: IosClientBrandingAttributes -> Maybe Text
$sel:logoUrl:IosClientBrandingAttributes' :: IosClientBrandingAttributes -> Maybe Text
$sel:logo3xUrl:IosClientBrandingAttributes' :: IosClientBrandingAttributes -> Maybe Text
$sel:logo2xUrl:IosClientBrandingAttributes' :: IosClientBrandingAttributes -> Maybe Text
$sel:loginMessage:IosClientBrandingAttributes' :: IosClientBrandingAttributes -> Maybe (HashMap Text Text)
$sel:forgotPasswordLink:IosClientBrandingAttributes' :: IosClientBrandingAttributes -> Maybe Text
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
forgotPasswordLink
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe (HashMap Text Text)
loginMessage
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
logo2xUrl
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
logo3xUrl
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
logoUrl
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
supportEmail
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
supportLink

instance Prelude.NFData IosClientBrandingAttributes where
  rnf :: IosClientBrandingAttributes -> ()
rnf IosClientBrandingAttributes' {Maybe Text
Maybe (HashMap Text Text)
supportLink :: Maybe Text
supportEmail :: Maybe Text
logoUrl :: Maybe Text
logo3xUrl :: Maybe Text
logo2xUrl :: Maybe Text
loginMessage :: Maybe (HashMap Text Text)
forgotPasswordLink :: Maybe Text
$sel:supportLink:IosClientBrandingAttributes' :: IosClientBrandingAttributes -> Maybe Text
$sel:supportEmail:IosClientBrandingAttributes' :: IosClientBrandingAttributes -> Maybe Text
$sel:logoUrl:IosClientBrandingAttributes' :: IosClientBrandingAttributes -> Maybe Text
$sel:logo3xUrl:IosClientBrandingAttributes' :: IosClientBrandingAttributes -> Maybe Text
$sel:logo2xUrl:IosClientBrandingAttributes' :: IosClientBrandingAttributes -> Maybe Text
$sel:loginMessage:IosClientBrandingAttributes' :: IosClientBrandingAttributes -> Maybe (HashMap Text Text)
$sel:forgotPasswordLink:IosClientBrandingAttributes' :: IosClientBrandingAttributes -> Maybe Text
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
forgotPasswordLink
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe (HashMap Text Text)
loginMessage
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
logo2xUrl
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
logo3xUrl
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
logoUrl
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
supportEmail
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
supportLink