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

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

-- |
-- Module      : Amazonka.SESV2.GetDeliverabilityDashboardOptions
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
--
-- Retrieve information about the status of the Deliverability dashboard
-- for your account. When the Deliverability dashboard is enabled, you gain
-- access to reputation, deliverability, and other metrics for the domains
-- that you use to send email. You also gain the ability to perform
-- predictive inbox placement tests.
--
-- When you use the Deliverability dashboard, you pay a monthly
-- subscription charge, in addition to any other fees that you accrue by
-- using Amazon SES and other Amazon Web Services services. For more
-- information about the features and cost of a Deliverability dashboard
-- subscription, see
-- <http://aws.amazon.com/ses/pricing/ Amazon SES Pricing>.
module Amazonka.SESV2.GetDeliverabilityDashboardOptions
  ( -- * Creating a Request
    GetDeliverabilityDashboardOptions (..),
    newGetDeliverabilityDashboardOptions,

    -- * Destructuring the Response
    GetDeliverabilityDashboardOptionsResponse (..),
    newGetDeliverabilityDashboardOptionsResponse,

    -- * Response Lenses
    getDeliverabilityDashboardOptionsResponse_accountStatus,
    getDeliverabilityDashboardOptionsResponse_activeSubscribedDomains,
    getDeliverabilityDashboardOptionsResponse_pendingExpirationSubscribedDomains,
    getDeliverabilityDashboardOptionsResponse_subscriptionExpiryDate,
    getDeliverabilityDashboardOptionsResponse_httpStatus,
    getDeliverabilityDashboardOptionsResponse_dashboardEnabled,
  )
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
import qualified Amazonka.Request as Request
import qualified Amazonka.Response as Response
import Amazonka.SESV2.Types

-- | Retrieve information about the status of the Deliverability dashboard
-- for your Amazon Web Services account. When the Deliverability dashboard
-- is enabled, you gain access to reputation, deliverability, and other
-- metrics for your domains. You also gain the ability to perform
-- predictive inbox placement tests.
--
-- When you use the Deliverability dashboard, you pay a monthly
-- subscription charge, in addition to any other fees that you accrue by
-- using Amazon SES and other Amazon Web Services services. For more
-- information about the features and cost of a Deliverability dashboard
-- subscription, see
-- <http://aws.amazon.com/pinpoint/pricing/ Amazon Pinpoint Pricing>.
--
-- /See:/ 'newGetDeliverabilityDashboardOptions' smart constructor.
data GetDeliverabilityDashboardOptions = GetDeliverabilityDashboardOptions'
  {
  }
  deriving (GetDeliverabilityDashboardOptions
-> GetDeliverabilityDashboardOptions -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: GetDeliverabilityDashboardOptions
-> GetDeliverabilityDashboardOptions -> Bool
$c/= :: GetDeliverabilityDashboardOptions
-> GetDeliverabilityDashboardOptions -> Bool
== :: GetDeliverabilityDashboardOptions
-> GetDeliverabilityDashboardOptions -> Bool
$c== :: GetDeliverabilityDashboardOptions
-> GetDeliverabilityDashboardOptions -> Bool
Prelude.Eq, ReadPrec [GetDeliverabilityDashboardOptions]
ReadPrec GetDeliverabilityDashboardOptions
Int -> ReadS GetDeliverabilityDashboardOptions
ReadS [GetDeliverabilityDashboardOptions]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [GetDeliverabilityDashboardOptions]
$creadListPrec :: ReadPrec [GetDeliverabilityDashboardOptions]
readPrec :: ReadPrec GetDeliverabilityDashboardOptions
$creadPrec :: ReadPrec GetDeliverabilityDashboardOptions
readList :: ReadS [GetDeliverabilityDashboardOptions]
$creadList :: ReadS [GetDeliverabilityDashboardOptions]
readsPrec :: Int -> ReadS GetDeliverabilityDashboardOptions
$creadsPrec :: Int -> ReadS GetDeliverabilityDashboardOptions
Prelude.Read, Int -> GetDeliverabilityDashboardOptions -> ShowS
[GetDeliverabilityDashboardOptions] -> ShowS
GetDeliverabilityDashboardOptions -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [GetDeliverabilityDashboardOptions] -> ShowS
$cshowList :: [GetDeliverabilityDashboardOptions] -> ShowS
show :: GetDeliverabilityDashboardOptions -> String
$cshow :: GetDeliverabilityDashboardOptions -> String
showsPrec :: Int -> GetDeliverabilityDashboardOptions -> ShowS
$cshowsPrec :: Int -> GetDeliverabilityDashboardOptions -> ShowS
Prelude.Show, forall x.
Rep GetDeliverabilityDashboardOptions x
-> GetDeliverabilityDashboardOptions
forall x.
GetDeliverabilityDashboardOptions
-> Rep GetDeliverabilityDashboardOptions x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep GetDeliverabilityDashboardOptions x
-> GetDeliverabilityDashboardOptions
$cfrom :: forall x.
GetDeliverabilityDashboardOptions
-> Rep GetDeliverabilityDashboardOptions x
Prelude.Generic)

-- |
-- Create a value of 'GetDeliverabilityDashboardOptions' 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.
newGetDeliverabilityDashboardOptions ::
  GetDeliverabilityDashboardOptions
newGetDeliverabilityDashboardOptions :: GetDeliverabilityDashboardOptions
newGetDeliverabilityDashboardOptions =
  GetDeliverabilityDashboardOptions
GetDeliverabilityDashboardOptions'

instance
  Core.AWSRequest
    GetDeliverabilityDashboardOptions
  where
  type
    AWSResponse GetDeliverabilityDashboardOptions =
      GetDeliverabilityDashboardOptionsResponse
  request :: (Service -> Service)
-> GetDeliverabilityDashboardOptions
-> Request GetDeliverabilityDashboardOptions
request Service -> Service
overrides =
    forall a. ToRequest a => Service -> a -> Request a
Request.get (Service -> Service
overrides Service
defaultService)
  response :: forall (m :: * -> *).
MonadResource m =>
(ByteStringLazy -> IO ByteStringLazy)
-> Service
-> Proxy GetDeliverabilityDashboardOptions
-> ClientResponse ClientBody
-> m (Either
        Error
        (ClientResponse (AWSResponse GetDeliverabilityDashboardOptions)))
response =
    forall (m :: * -> *) a.
MonadResource m =>
(Int -> ResponseHeaders -> Object -> Either String (AWSResponse a))
-> (ByteStringLazy -> IO ByteStringLazy)
-> Service
-> Proxy a
-> ClientResponse ClientBody
-> m (Either Error (ClientResponse (AWSResponse a)))
Response.receiveJSON
      ( \Int
s ResponseHeaders
h Object
x ->
          Maybe DeliverabilityDashboardAccountStatus
-> Maybe [DomainDeliverabilityTrackingOption]
-> Maybe [DomainDeliverabilityTrackingOption]
-> Maybe POSIX
-> Int
-> Bool
-> GetDeliverabilityDashboardOptionsResponse
GetDeliverabilityDashboardOptionsResponse'
            forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"AccountStatus")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> ( Object
x
                            forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"ActiveSubscribedDomains"
                            forall (f :: * -> *) a. Functor f => f (Maybe a) -> a -> f a
Core..!@ 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 -> Either String (Maybe a)
Data..?> Key
"PendingExpirationSubscribedDomains"
                            forall (f :: * -> *) a. Functor f => f (Maybe a) -> a -> f a
Core..!@ 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 -> Either String (Maybe a)
Data..?> Key
"SubscriptionExpiryDate")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure (forall a. Enum a => a -> Int
Prelude.fromEnum Int
s))
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String a
Data..:> Key
"DashboardEnabled")
      )

instance
  Prelude.Hashable
    GetDeliverabilityDashboardOptions
  where
  hashWithSalt :: Int -> GetDeliverabilityDashboardOptions -> Int
hashWithSalt Int
_salt GetDeliverabilityDashboardOptions
_ =
    Int
_salt forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` ()

instance
  Prelude.NFData
    GetDeliverabilityDashboardOptions
  where
  rnf :: GetDeliverabilityDashboardOptions -> ()
rnf GetDeliverabilityDashboardOptions
_ = ()

instance
  Data.ToHeaders
    GetDeliverabilityDashboardOptions
  where
  toHeaders :: GetDeliverabilityDashboardOptions -> ResponseHeaders
toHeaders =
    forall a b. a -> b -> a
Prelude.const
      ( forall a. Monoid a => [a] -> a
Prelude.mconcat
          [ HeaderName
"Content-Type"
              forall a. ToHeader a => HeaderName -> a -> ResponseHeaders
Data.=# ( ByteString
"application/x-amz-json-1.1" ::
                          Prelude.ByteString
                      )
          ]
      )

instance
  Data.ToPath
    GetDeliverabilityDashboardOptions
  where
  toPath :: GetDeliverabilityDashboardOptions -> ByteString
toPath =
    forall a b. a -> b -> a
Prelude.const ByteString
"/v2/email/deliverability-dashboard"

instance
  Data.ToQuery
    GetDeliverabilityDashboardOptions
  where
  toQuery :: GetDeliverabilityDashboardOptions -> QueryString
toQuery = forall a b. a -> b -> a
Prelude.const forall a. Monoid a => a
Prelude.mempty

-- | An object that shows the status of the Deliverability dashboard.
--
-- /See:/ 'newGetDeliverabilityDashboardOptionsResponse' smart constructor.
data GetDeliverabilityDashboardOptionsResponse = GetDeliverabilityDashboardOptionsResponse'
  { -- | The current status of your Deliverability dashboard subscription. If
    -- this value is @PENDING_EXPIRATION@, your subscription is scheduled to
    -- expire at the end of the current calendar month.
    GetDeliverabilityDashboardOptionsResponse
-> Maybe DeliverabilityDashboardAccountStatus
accountStatus :: Prelude.Maybe DeliverabilityDashboardAccountStatus,
    -- | An array of objects, one for each verified domain that you use to send
    -- email and currently has an active Deliverability dashboard subscription
    -- that isn’t scheduled to expire at the end of the current calendar month.
    GetDeliverabilityDashboardOptionsResponse
-> Maybe [DomainDeliverabilityTrackingOption]
activeSubscribedDomains :: Prelude.Maybe [DomainDeliverabilityTrackingOption],
    -- | An array of objects, one for each verified domain that you use to send
    -- email and currently has an active Deliverability dashboard subscription
    -- that\'s scheduled to expire at the end of the current calendar month.
    GetDeliverabilityDashboardOptionsResponse
-> Maybe [DomainDeliverabilityTrackingOption]
pendingExpirationSubscribedDomains :: Prelude.Maybe [DomainDeliverabilityTrackingOption],
    -- | The date when your current subscription to the Deliverability dashboard
    -- is scheduled to expire, if your subscription is scheduled to expire at
    -- the end of the current calendar month. This value is null if you have an
    -- active subscription that isn’t due to expire at the end of the month.
    GetDeliverabilityDashboardOptionsResponse -> Maybe POSIX
subscriptionExpiryDate :: Prelude.Maybe Data.POSIX,
    -- | The response's http status code.
    GetDeliverabilityDashboardOptionsResponse -> Int
httpStatus :: Prelude.Int,
    -- | Specifies whether the Deliverability dashboard is enabled. If this value
    -- is @true@, the dashboard is enabled.
    GetDeliverabilityDashboardOptionsResponse -> Bool
dashboardEnabled :: Prelude.Bool
  }
  deriving (GetDeliverabilityDashboardOptionsResponse
-> GetDeliverabilityDashboardOptionsResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: GetDeliverabilityDashboardOptionsResponse
-> GetDeliverabilityDashboardOptionsResponse -> Bool
$c/= :: GetDeliverabilityDashboardOptionsResponse
-> GetDeliverabilityDashboardOptionsResponse -> Bool
== :: GetDeliverabilityDashboardOptionsResponse
-> GetDeliverabilityDashboardOptionsResponse -> Bool
$c== :: GetDeliverabilityDashboardOptionsResponse
-> GetDeliverabilityDashboardOptionsResponse -> Bool
Prelude.Eq, ReadPrec [GetDeliverabilityDashboardOptionsResponse]
ReadPrec GetDeliverabilityDashboardOptionsResponse
Int -> ReadS GetDeliverabilityDashboardOptionsResponse
ReadS [GetDeliverabilityDashboardOptionsResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [GetDeliverabilityDashboardOptionsResponse]
$creadListPrec :: ReadPrec [GetDeliverabilityDashboardOptionsResponse]
readPrec :: ReadPrec GetDeliverabilityDashboardOptionsResponse
$creadPrec :: ReadPrec GetDeliverabilityDashboardOptionsResponse
readList :: ReadS [GetDeliverabilityDashboardOptionsResponse]
$creadList :: ReadS [GetDeliverabilityDashboardOptionsResponse]
readsPrec :: Int -> ReadS GetDeliverabilityDashboardOptionsResponse
$creadsPrec :: Int -> ReadS GetDeliverabilityDashboardOptionsResponse
Prelude.Read, Int -> GetDeliverabilityDashboardOptionsResponse -> ShowS
[GetDeliverabilityDashboardOptionsResponse] -> ShowS
GetDeliverabilityDashboardOptionsResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [GetDeliverabilityDashboardOptionsResponse] -> ShowS
$cshowList :: [GetDeliverabilityDashboardOptionsResponse] -> ShowS
show :: GetDeliverabilityDashboardOptionsResponse -> String
$cshow :: GetDeliverabilityDashboardOptionsResponse -> String
showsPrec :: Int -> GetDeliverabilityDashboardOptionsResponse -> ShowS
$cshowsPrec :: Int -> GetDeliverabilityDashboardOptionsResponse -> ShowS
Prelude.Show, forall x.
Rep GetDeliverabilityDashboardOptionsResponse x
-> GetDeliverabilityDashboardOptionsResponse
forall x.
GetDeliverabilityDashboardOptionsResponse
-> Rep GetDeliverabilityDashboardOptionsResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep GetDeliverabilityDashboardOptionsResponse x
-> GetDeliverabilityDashboardOptionsResponse
$cfrom :: forall x.
GetDeliverabilityDashboardOptionsResponse
-> Rep GetDeliverabilityDashboardOptionsResponse x
Prelude.Generic)

-- |
-- Create a value of 'GetDeliverabilityDashboardOptionsResponse' 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:
--
-- 'accountStatus', 'getDeliverabilityDashboardOptionsResponse_accountStatus' - The current status of your Deliverability dashboard subscription. If
-- this value is @PENDING_EXPIRATION@, your subscription is scheduled to
-- expire at the end of the current calendar month.
--
-- 'activeSubscribedDomains', 'getDeliverabilityDashboardOptionsResponse_activeSubscribedDomains' - An array of objects, one for each verified domain that you use to send
-- email and currently has an active Deliverability dashboard subscription
-- that isn’t scheduled to expire at the end of the current calendar month.
--
-- 'pendingExpirationSubscribedDomains', 'getDeliverabilityDashboardOptionsResponse_pendingExpirationSubscribedDomains' - An array of objects, one for each verified domain that you use to send
-- email and currently has an active Deliverability dashboard subscription
-- that\'s scheduled to expire at the end of the current calendar month.
--
-- 'subscriptionExpiryDate', 'getDeliverabilityDashboardOptionsResponse_subscriptionExpiryDate' - The date when your current subscription to the Deliverability dashboard
-- is scheduled to expire, if your subscription is scheduled to expire at
-- the end of the current calendar month. This value is null if you have an
-- active subscription that isn’t due to expire at the end of the month.
--
-- 'httpStatus', 'getDeliverabilityDashboardOptionsResponse_httpStatus' - The response's http status code.
--
-- 'dashboardEnabled', 'getDeliverabilityDashboardOptionsResponse_dashboardEnabled' - Specifies whether the Deliverability dashboard is enabled. If this value
-- is @true@, the dashboard is enabled.
newGetDeliverabilityDashboardOptionsResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  -- | 'dashboardEnabled'
  Prelude.Bool ->
  GetDeliverabilityDashboardOptionsResponse
newGetDeliverabilityDashboardOptionsResponse :: Int -> Bool -> GetDeliverabilityDashboardOptionsResponse
newGetDeliverabilityDashboardOptionsResponse
  Int
pHttpStatus_
  Bool
pDashboardEnabled_ =
    GetDeliverabilityDashboardOptionsResponse'
      { $sel:accountStatus:GetDeliverabilityDashboardOptionsResponse' :: Maybe DeliverabilityDashboardAccountStatus
accountStatus =
          forall a. Maybe a
Prelude.Nothing,
        $sel:activeSubscribedDomains:GetDeliverabilityDashboardOptionsResponse' :: Maybe [DomainDeliverabilityTrackingOption]
activeSubscribedDomains =
          forall a. Maybe a
Prelude.Nothing,
        $sel:pendingExpirationSubscribedDomains:GetDeliverabilityDashboardOptionsResponse' :: Maybe [DomainDeliverabilityTrackingOption]
pendingExpirationSubscribedDomains =
          forall a. Maybe a
Prelude.Nothing,
        $sel:subscriptionExpiryDate:GetDeliverabilityDashboardOptionsResponse' :: Maybe POSIX
subscriptionExpiryDate =
          forall a. Maybe a
Prelude.Nothing,
        $sel:httpStatus:GetDeliverabilityDashboardOptionsResponse' :: Int
httpStatus = Int
pHttpStatus_,
        $sel:dashboardEnabled:GetDeliverabilityDashboardOptionsResponse' :: Bool
dashboardEnabled =
          Bool
pDashboardEnabled_
      }

-- | The current status of your Deliverability dashboard subscription. If
-- this value is @PENDING_EXPIRATION@, your subscription is scheduled to
-- expire at the end of the current calendar month.
getDeliverabilityDashboardOptionsResponse_accountStatus :: Lens.Lens' GetDeliverabilityDashboardOptionsResponse (Prelude.Maybe DeliverabilityDashboardAccountStatus)
getDeliverabilityDashboardOptionsResponse_accountStatus :: Lens'
  GetDeliverabilityDashboardOptionsResponse
  (Maybe DeliverabilityDashboardAccountStatus)
getDeliverabilityDashboardOptionsResponse_accountStatus = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetDeliverabilityDashboardOptionsResponse' {Maybe DeliverabilityDashboardAccountStatus
accountStatus :: Maybe DeliverabilityDashboardAccountStatus
$sel:accountStatus:GetDeliverabilityDashboardOptionsResponse' :: GetDeliverabilityDashboardOptionsResponse
-> Maybe DeliverabilityDashboardAccountStatus
accountStatus} -> Maybe DeliverabilityDashboardAccountStatus
accountStatus) (\s :: GetDeliverabilityDashboardOptionsResponse
s@GetDeliverabilityDashboardOptionsResponse' {} Maybe DeliverabilityDashboardAccountStatus
a -> GetDeliverabilityDashboardOptionsResponse
s {$sel:accountStatus:GetDeliverabilityDashboardOptionsResponse' :: Maybe DeliverabilityDashboardAccountStatus
accountStatus = Maybe DeliverabilityDashboardAccountStatus
a} :: GetDeliverabilityDashboardOptionsResponse)

-- | An array of objects, one for each verified domain that you use to send
-- email and currently has an active Deliverability dashboard subscription
-- that isn’t scheduled to expire at the end of the current calendar month.
getDeliverabilityDashboardOptionsResponse_activeSubscribedDomains :: Lens.Lens' GetDeliverabilityDashboardOptionsResponse (Prelude.Maybe [DomainDeliverabilityTrackingOption])
getDeliverabilityDashboardOptionsResponse_activeSubscribedDomains :: Lens'
  GetDeliverabilityDashboardOptionsResponse
  (Maybe [DomainDeliverabilityTrackingOption])
getDeliverabilityDashboardOptionsResponse_activeSubscribedDomains = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetDeliverabilityDashboardOptionsResponse' {Maybe [DomainDeliverabilityTrackingOption]
activeSubscribedDomains :: Maybe [DomainDeliverabilityTrackingOption]
$sel:activeSubscribedDomains:GetDeliverabilityDashboardOptionsResponse' :: GetDeliverabilityDashboardOptionsResponse
-> Maybe [DomainDeliverabilityTrackingOption]
activeSubscribedDomains} -> Maybe [DomainDeliverabilityTrackingOption]
activeSubscribedDomains) (\s :: GetDeliverabilityDashboardOptionsResponse
s@GetDeliverabilityDashboardOptionsResponse' {} Maybe [DomainDeliverabilityTrackingOption]
a -> GetDeliverabilityDashboardOptionsResponse
s {$sel:activeSubscribedDomains:GetDeliverabilityDashboardOptionsResponse' :: Maybe [DomainDeliverabilityTrackingOption]
activeSubscribedDomains = Maybe [DomainDeliverabilityTrackingOption]
a} :: GetDeliverabilityDashboardOptionsResponse) 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

-- | An array of objects, one for each verified domain that you use to send
-- email and currently has an active Deliverability dashboard subscription
-- that\'s scheduled to expire at the end of the current calendar month.
getDeliverabilityDashboardOptionsResponse_pendingExpirationSubscribedDomains :: Lens.Lens' GetDeliverabilityDashboardOptionsResponse (Prelude.Maybe [DomainDeliverabilityTrackingOption])
getDeliverabilityDashboardOptionsResponse_pendingExpirationSubscribedDomains :: Lens'
  GetDeliverabilityDashboardOptionsResponse
  (Maybe [DomainDeliverabilityTrackingOption])
getDeliverabilityDashboardOptionsResponse_pendingExpirationSubscribedDomains = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetDeliverabilityDashboardOptionsResponse' {Maybe [DomainDeliverabilityTrackingOption]
pendingExpirationSubscribedDomains :: Maybe [DomainDeliverabilityTrackingOption]
$sel:pendingExpirationSubscribedDomains:GetDeliverabilityDashboardOptionsResponse' :: GetDeliverabilityDashboardOptionsResponse
-> Maybe [DomainDeliverabilityTrackingOption]
pendingExpirationSubscribedDomains} -> Maybe [DomainDeliverabilityTrackingOption]
pendingExpirationSubscribedDomains) (\s :: GetDeliverabilityDashboardOptionsResponse
s@GetDeliverabilityDashboardOptionsResponse' {} Maybe [DomainDeliverabilityTrackingOption]
a -> GetDeliverabilityDashboardOptionsResponse
s {$sel:pendingExpirationSubscribedDomains:GetDeliverabilityDashboardOptionsResponse' :: Maybe [DomainDeliverabilityTrackingOption]
pendingExpirationSubscribedDomains = Maybe [DomainDeliverabilityTrackingOption]
a} :: GetDeliverabilityDashboardOptionsResponse) 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 date when your current subscription to the Deliverability dashboard
-- is scheduled to expire, if your subscription is scheduled to expire at
-- the end of the current calendar month. This value is null if you have an
-- active subscription that isn’t due to expire at the end of the month.
getDeliverabilityDashboardOptionsResponse_subscriptionExpiryDate :: Lens.Lens' GetDeliverabilityDashboardOptionsResponse (Prelude.Maybe Prelude.UTCTime)
getDeliverabilityDashboardOptionsResponse_subscriptionExpiryDate :: Lens' GetDeliverabilityDashboardOptionsResponse (Maybe UTCTime)
getDeliverabilityDashboardOptionsResponse_subscriptionExpiryDate = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetDeliverabilityDashboardOptionsResponse' {Maybe POSIX
subscriptionExpiryDate :: Maybe POSIX
$sel:subscriptionExpiryDate:GetDeliverabilityDashboardOptionsResponse' :: GetDeliverabilityDashboardOptionsResponse -> Maybe POSIX
subscriptionExpiryDate} -> Maybe POSIX
subscriptionExpiryDate) (\s :: GetDeliverabilityDashboardOptionsResponse
s@GetDeliverabilityDashboardOptionsResponse' {} Maybe POSIX
a -> GetDeliverabilityDashboardOptionsResponse
s {$sel:subscriptionExpiryDate:GetDeliverabilityDashboardOptionsResponse' :: Maybe POSIX
subscriptionExpiryDate = Maybe POSIX
a} :: GetDeliverabilityDashboardOptionsResponse) 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 (a :: Format). Iso' (Time a) UTCTime
Data._Time

-- | The response's http status code.
getDeliverabilityDashboardOptionsResponse_httpStatus :: Lens.Lens' GetDeliverabilityDashboardOptionsResponse Prelude.Int
getDeliverabilityDashboardOptionsResponse_httpStatus :: Lens' GetDeliverabilityDashboardOptionsResponse Int
getDeliverabilityDashboardOptionsResponse_httpStatus = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetDeliverabilityDashboardOptionsResponse' {Int
httpStatus :: Int
$sel:httpStatus:GetDeliverabilityDashboardOptionsResponse' :: GetDeliverabilityDashboardOptionsResponse -> Int
httpStatus} -> Int
httpStatus) (\s :: GetDeliverabilityDashboardOptionsResponse
s@GetDeliverabilityDashboardOptionsResponse' {} Int
a -> GetDeliverabilityDashboardOptionsResponse
s {$sel:httpStatus:GetDeliverabilityDashboardOptionsResponse' :: Int
httpStatus = Int
a} :: GetDeliverabilityDashboardOptionsResponse)

-- | Specifies whether the Deliverability dashboard is enabled. If this value
-- is @true@, the dashboard is enabled.
getDeliverabilityDashboardOptionsResponse_dashboardEnabled :: Lens.Lens' GetDeliverabilityDashboardOptionsResponse Prelude.Bool
getDeliverabilityDashboardOptionsResponse_dashboardEnabled :: Lens' GetDeliverabilityDashboardOptionsResponse Bool
getDeliverabilityDashboardOptionsResponse_dashboardEnabled = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetDeliverabilityDashboardOptionsResponse' {Bool
dashboardEnabled :: Bool
$sel:dashboardEnabled:GetDeliverabilityDashboardOptionsResponse' :: GetDeliverabilityDashboardOptionsResponse -> Bool
dashboardEnabled} -> Bool
dashboardEnabled) (\s :: GetDeliverabilityDashboardOptionsResponse
s@GetDeliverabilityDashboardOptionsResponse' {} Bool
a -> GetDeliverabilityDashboardOptionsResponse
s {$sel:dashboardEnabled:GetDeliverabilityDashboardOptionsResponse' :: Bool
dashboardEnabled = Bool
a} :: GetDeliverabilityDashboardOptionsResponse)

instance
  Prelude.NFData
    GetDeliverabilityDashboardOptionsResponse
  where
  rnf :: GetDeliverabilityDashboardOptionsResponse -> ()
rnf GetDeliverabilityDashboardOptionsResponse' {Bool
Int
Maybe [DomainDeliverabilityTrackingOption]
Maybe POSIX
Maybe DeliverabilityDashboardAccountStatus
dashboardEnabled :: Bool
httpStatus :: Int
subscriptionExpiryDate :: Maybe POSIX
pendingExpirationSubscribedDomains :: Maybe [DomainDeliverabilityTrackingOption]
activeSubscribedDomains :: Maybe [DomainDeliverabilityTrackingOption]
accountStatus :: Maybe DeliverabilityDashboardAccountStatus
$sel:dashboardEnabled:GetDeliverabilityDashboardOptionsResponse' :: GetDeliverabilityDashboardOptionsResponse -> Bool
$sel:httpStatus:GetDeliverabilityDashboardOptionsResponse' :: GetDeliverabilityDashboardOptionsResponse -> Int
$sel:subscriptionExpiryDate:GetDeliverabilityDashboardOptionsResponse' :: GetDeliverabilityDashboardOptionsResponse -> Maybe POSIX
$sel:pendingExpirationSubscribedDomains:GetDeliverabilityDashboardOptionsResponse' :: GetDeliverabilityDashboardOptionsResponse
-> Maybe [DomainDeliverabilityTrackingOption]
$sel:activeSubscribedDomains:GetDeliverabilityDashboardOptionsResponse' :: GetDeliverabilityDashboardOptionsResponse
-> Maybe [DomainDeliverabilityTrackingOption]
$sel:accountStatus:GetDeliverabilityDashboardOptionsResponse' :: GetDeliverabilityDashboardOptionsResponse
-> Maybe DeliverabilityDashboardAccountStatus
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe DeliverabilityDashboardAccountStatus
accountStatus
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [DomainDeliverabilityTrackingOption]
activeSubscribedDomains
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [DomainDeliverabilityTrackingOption]
pendingExpirationSubscribedDomains
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe POSIX
subscriptionExpiryDate
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Int
httpStatus
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Bool
dashboardEnabled