{-# 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.GuardDuty.DescribePublishingDestination
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
--
-- Returns information about the publishing destination specified by the
-- provided @destinationId@.
module Amazonka.GuardDuty.DescribePublishingDestination
  ( -- * Creating a Request
    DescribePublishingDestination (..),
    newDescribePublishingDestination,

    -- * Request Lenses
    describePublishingDestination_detectorId,
    describePublishingDestination_destinationId,

    -- * Destructuring the Response
    DescribePublishingDestinationResponse (..),
    newDescribePublishingDestinationResponse,

    -- * Response Lenses
    describePublishingDestinationResponse_httpStatus,
    describePublishingDestinationResponse_destinationId,
    describePublishingDestinationResponse_destinationType,
    describePublishingDestinationResponse_status,
    describePublishingDestinationResponse_publishingFailureStartTimestamp,
    describePublishingDestinationResponse_destinationProperties,
  )
where

import qualified Amazonka.Core as Core
import qualified Amazonka.Core.Lens.Internal as Lens
import qualified Amazonka.Data as Data
import Amazonka.GuardDuty.Types
import qualified Amazonka.Prelude as Prelude
import qualified Amazonka.Request as Request
import qualified Amazonka.Response as Response

-- | /See:/ 'newDescribePublishingDestination' smart constructor.
data DescribePublishingDestination = DescribePublishingDestination'
  { -- | The unique ID of the detector associated with the publishing destination
    -- to retrieve.
    DescribePublishingDestination -> Text
detectorId :: Prelude.Text,
    -- | The ID of the publishing destination to retrieve.
    DescribePublishingDestination -> Text
destinationId :: Prelude.Text
  }
  deriving (DescribePublishingDestination
-> DescribePublishingDestination -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DescribePublishingDestination
-> DescribePublishingDestination -> Bool
$c/= :: DescribePublishingDestination
-> DescribePublishingDestination -> Bool
== :: DescribePublishingDestination
-> DescribePublishingDestination -> Bool
$c== :: DescribePublishingDestination
-> DescribePublishingDestination -> Bool
Prelude.Eq, ReadPrec [DescribePublishingDestination]
ReadPrec DescribePublishingDestination
Int -> ReadS DescribePublishingDestination
ReadS [DescribePublishingDestination]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [DescribePublishingDestination]
$creadListPrec :: ReadPrec [DescribePublishingDestination]
readPrec :: ReadPrec DescribePublishingDestination
$creadPrec :: ReadPrec DescribePublishingDestination
readList :: ReadS [DescribePublishingDestination]
$creadList :: ReadS [DescribePublishingDestination]
readsPrec :: Int -> ReadS DescribePublishingDestination
$creadsPrec :: Int -> ReadS DescribePublishingDestination
Prelude.Read, Int -> DescribePublishingDestination -> ShowS
[DescribePublishingDestination] -> ShowS
DescribePublishingDestination -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DescribePublishingDestination] -> ShowS
$cshowList :: [DescribePublishingDestination] -> ShowS
show :: DescribePublishingDestination -> String
$cshow :: DescribePublishingDestination -> String
showsPrec :: Int -> DescribePublishingDestination -> ShowS
$cshowsPrec :: Int -> DescribePublishingDestination -> ShowS
Prelude.Show, forall x.
Rep DescribePublishingDestination x
-> DescribePublishingDestination
forall x.
DescribePublishingDestination
-> Rep DescribePublishingDestination x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep DescribePublishingDestination x
-> DescribePublishingDestination
$cfrom :: forall x.
DescribePublishingDestination
-> Rep DescribePublishingDestination x
Prelude.Generic)

-- |
-- Create a value of 'DescribePublishingDestination' 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:
--
-- 'detectorId', 'describePublishingDestination_detectorId' - The unique ID of the detector associated with the publishing destination
-- to retrieve.
--
-- 'destinationId', 'describePublishingDestination_destinationId' - The ID of the publishing destination to retrieve.
newDescribePublishingDestination ::
  -- | 'detectorId'
  Prelude.Text ->
  -- | 'destinationId'
  Prelude.Text ->
  DescribePublishingDestination
newDescribePublishingDestination :: Text -> Text -> DescribePublishingDestination
newDescribePublishingDestination
  Text
pDetectorId_
  Text
pDestinationId_ =
    DescribePublishingDestination'
      { $sel:detectorId:DescribePublishingDestination' :: Text
detectorId =
          Text
pDetectorId_,
        $sel:destinationId:DescribePublishingDestination' :: Text
destinationId = Text
pDestinationId_
      }

-- | The unique ID of the detector associated with the publishing destination
-- to retrieve.
describePublishingDestination_detectorId :: Lens.Lens' DescribePublishingDestination Prelude.Text
describePublishingDestination_detectorId :: Lens' DescribePublishingDestination Text
describePublishingDestination_detectorId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribePublishingDestination' {Text
detectorId :: Text
$sel:detectorId:DescribePublishingDestination' :: DescribePublishingDestination -> Text
detectorId} -> Text
detectorId) (\s :: DescribePublishingDestination
s@DescribePublishingDestination' {} Text
a -> DescribePublishingDestination
s {$sel:detectorId:DescribePublishingDestination' :: Text
detectorId = Text
a} :: DescribePublishingDestination)

-- | The ID of the publishing destination to retrieve.
describePublishingDestination_destinationId :: Lens.Lens' DescribePublishingDestination Prelude.Text
describePublishingDestination_destinationId :: Lens' DescribePublishingDestination Text
describePublishingDestination_destinationId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribePublishingDestination' {Text
destinationId :: Text
$sel:destinationId:DescribePublishingDestination' :: DescribePublishingDestination -> Text
destinationId} -> Text
destinationId) (\s :: DescribePublishingDestination
s@DescribePublishingDestination' {} Text
a -> DescribePublishingDestination
s {$sel:destinationId:DescribePublishingDestination' :: Text
destinationId = Text
a} :: DescribePublishingDestination)

instance
  Core.AWSRequest
    DescribePublishingDestination
  where
  type
    AWSResponse DescribePublishingDestination =
      DescribePublishingDestinationResponse
  request :: (Service -> Service)
-> DescribePublishingDestination
-> Request DescribePublishingDestination
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 DescribePublishingDestination
-> ClientResponse ClientBody
-> m (Either
        Error (ClientResponse (AWSResponse DescribePublishingDestination)))
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 ->
          Int
-> Text
-> DestinationType
-> PublishingStatus
-> Integer
-> DestinationProperties
-> DescribePublishingDestinationResponse
DescribePublishingDestinationResponse'
            forall (f :: * -> *) a b. Functor 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
"destinationId")
            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
"destinationType")
            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
"status")
            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
"publishingFailureStartTimestamp")
            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
"destinationProperties")
      )

instance
  Prelude.Hashable
    DescribePublishingDestination
  where
  hashWithSalt :: Int -> DescribePublishingDestination -> Int
hashWithSalt Int
_salt DescribePublishingDestination' {Text
destinationId :: Text
detectorId :: Text
$sel:destinationId:DescribePublishingDestination' :: DescribePublishingDestination -> Text
$sel:detectorId:DescribePublishingDestination' :: DescribePublishingDestination -> Text
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
detectorId
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
destinationId

instance Prelude.NFData DescribePublishingDestination where
  rnf :: DescribePublishingDestination -> ()
rnf DescribePublishingDestination' {Text
destinationId :: Text
detectorId :: Text
$sel:destinationId:DescribePublishingDestination' :: DescribePublishingDestination -> Text
$sel:detectorId:DescribePublishingDestination' :: DescribePublishingDestination -> Text
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Text
detectorId
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Text
destinationId

instance Data.ToHeaders DescribePublishingDestination where
  toHeaders :: DescribePublishingDestination -> 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 DescribePublishingDestination where
  toPath :: DescribePublishingDestination -> ByteString
toPath DescribePublishingDestination' {Text
destinationId :: Text
detectorId :: Text
$sel:destinationId:DescribePublishingDestination' :: DescribePublishingDestination -> Text
$sel:detectorId:DescribePublishingDestination' :: DescribePublishingDestination -> Text
..} =
    forall a. Monoid a => [a] -> a
Prelude.mconcat
      [ ByteString
"/detector/",
        forall a. ToByteString a => a -> ByteString
Data.toBS Text
detectorId,
        ByteString
"/publishingDestination/",
        forall a. ToByteString a => a -> ByteString
Data.toBS Text
destinationId
      ]

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

-- | /See:/ 'newDescribePublishingDestinationResponse' smart constructor.
data DescribePublishingDestinationResponse = DescribePublishingDestinationResponse'
  { -- | The response's http status code.
    DescribePublishingDestinationResponse -> Int
httpStatus :: Prelude.Int,
    -- | The ID of the publishing destination.
    DescribePublishingDestinationResponse -> Text
destinationId :: Prelude.Text,
    -- | The type of publishing destination. Currently, only Amazon S3 buckets
    -- are supported.
    DescribePublishingDestinationResponse -> DestinationType
destinationType :: DestinationType,
    -- | The status of the publishing destination.
    DescribePublishingDestinationResponse -> PublishingStatus
status :: PublishingStatus,
    -- | The time, in epoch millisecond format, at which GuardDuty was first
    -- unable to publish findings to the destination.
    DescribePublishingDestinationResponse -> Integer
publishingFailureStartTimestamp :: Prelude.Integer,
    -- | A @DestinationProperties@ object that includes the @DestinationArn@ and
    -- @KmsKeyArn@ of the publishing destination.
    DescribePublishingDestinationResponse -> DestinationProperties
destinationProperties :: DestinationProperties
  }
  deriving (DescribePublishingDestinationResponse
-> DescribePublishingDestinationResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DescribePublishingDestinationResponse
-> DescribePublishingDestinationResponse -> Bool
$c/= :: DescribePublishingDestinationResponse
-> DescribePublishingDestinationResponse -> Bool
== :: DescribePublishingDestinationResponse
-> DescribePublishingDestinationResponse -> Bool
$c== :: DescribePublishingDestinationResponse
-> DescribePublishingDestinationResponse -> Bool
Prelude.Eq, ReadPrec [DescribePublishingDestinationResponse]
ReadPrec DescribePublishingDestinationResponse
Int -> ReadS DescribePublishingDestinationResponse
ReadS [DescribePublishingDestinationResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [DescribePublishingDestinationResponse]
$creadListPrec :: ReadPrec [DescribePublishingDestinationResponse]
readPrec :: ReadPrec DescribePublishingDestinationResponse
$creadPrec :: ReadPrec DescribePublishingDestinationResponse
readList :: ReadS [DescribePublishingDestinationResponse]
$creadList :: ReadS [DescribePublishingDestinationResponse]
readsPrec :: Int -> ReadS DescribePublishingDestinationResponse
$creadsPrec :: Int -> ReadS DescribePublishingDestinationResponse
Prelude.Read, Int -> DescribePublishingDestinationResponse -> ShowS
[DescribePublishingDestinationResponse] -> ShowS
DescribePublishingDestinationResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DescribePublishingDestinationResponse] -> ShowS
$cshowList :: [DescribePublishingDestinationResponse] -> ShowS
show :: DescribePublishingDestinationResponse -> String
$cshow :: DescribePublishingDestinationResponse -> String
showsPrec :: Int -> DescribePublishingDestinationResponse -> ShowS
$cshowsPrec :: Int -> DescribePublishingDestinationResponse -> ShowS
Prelude.Show, forall x.
Rep DescribePublishingDestinationResponse x
-> DescribePublishingDestinationResponse
forall x.
DescribePublishingDestinationResponse
-> Rep DescribePublishingDestinationResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep DescribePublishingDestinationResponse x
-> DescribePublishingDestinationResponse
$cfrom :: forall x.
DescribePublishingDestinationResponse
-> Rep DescribePublishingDestinationResponse x
Prelude.Generic)

-- |
-- Create a value of 'DescribePublishingDestinationResponse' 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:
--
-- 'httpStatus', 'describePublishingDestinationResponse_httpStatus' - The response's http status code.
--
-- 'destinationId', 'describePublishingDestinationResponse_destinationId' - The ID of the publishing destination.
--
-- 'destinationType', 'describePublishingDestinationResponse_destinationType' - The type of publishing destination. Currently, only Amazon S3 buckets
-- are supported.
--
-- 'status', 'describePublishingDestinationResponse_status' - The status of the publishing destination.
--
-- 'publishingFailureStartTimestamp', 'describePublishingDestinationResponse_publishingFailureStartTimestamp' - The time, in epoch millisecond format, at which GuardDuty was first
-- unable to publish findings to the destination.
--
-- 'destinationProperties', 'describePublishingDestinationResponse_destinationProperties' - A @DestinationProperties@ object that includes the @DestinationArn@ and
-- @KmsKeyArn@ of the publishing destination.
newDescribePublishingDestinationResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  -- | 'destinationId'
  Prelude.Text ->
  -- | 'destinationType'
  DestinationType ->
  -- | 'status'
  PublishingStatus ->
  -- | 'publishingFailureStartTimestamp'
  Prelude.Integer ->
  -- | 'destinationProperties'
  DestinationProperties ->
  DescribePublishingDestinationResponse
newDescribePublishingDestinationResponse :: Int
-> Text
-> DestinationType
-> PublishingStatus
-> Integer
-> DestinationProperties
-> DescribePublishingDestinationResponse
newDescribePublishingDestinationResponse
  Int
pHttpStatus_
  Text
pDestinationId_
  DestinationType
pDestinationType_
  PublishingStatus
pStatus_
  Integer
pPublishingFailureStartTimestamp_
  DestinationProperties
pDestinationProperties_ =
    DescribePublishingDestinationResponse'
      { $sel:httpStatus:DescribePublishingDestinationResponse' :: Int
httpStatus =
          Int
pHttpStatus_,
        $sel:destinationId:DescribePublishingDestinationResponse' :: Text
destinationId = Text
pDestinationId_,
        $sel:destinationType:DescribePublishingDestinationResponse' :: DestinationType
destinationType = DestinationType
pDestinationType_,
        $sel:status:DescribePublishingDestinationResponse' :: PublishingStatus
status = PublishingStatus
pStatus_,
        $sel:publishingFailureStartTimestamp:DescribePublishingDestinationResponse' :: Integer
publishingFailureStartTimestamp =
          Integer
pPublishingFailureStartTimestamp_,
        $sel:destinationProperties:DescribePublishingDestinationResponse' :: DestinationProperties
destinationProperties =
          DestinationProperties
pDestinationProperties_
      }

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

-- | The ID of the publishing destination.
describePublishingDestinationResponse_destinationId :: Lens.Lens' DescribePublishingDestinationResponse Prelude.Text
describePublishingDestinationResponse_destinationId :: Lens' DescribePublishingDestinationResponse Text
describePublishingDestinationResponse_destinationId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribePublishingDestinationResponse' {Text
destinationId :: Text
$sel:destinationId:DescribePublishingDestinationResponse' :: DescribePublishingDestinationResponse -> Text
destinationId} -> Text
destinationId) (\s :: DescribePublishingDestinationResponse
s@DescribePublishingDestinationResponse' {} Text
a -> DescribePublishingDestinationResponse
s {$sel:destinationId:DescribePublishingDestinationResponse' :: Text
destinationId = Text
a} :: DescribePublishingDestinationResponse)

-- | The type of publishing destination. Currently, only Amazon S3 buckets
-- are supported.
describePublishingDestinationResponse_destinationType :: Lens.Lens' DescribePublishingDestinationResponse DestinationType
describePublishingDestinationResponse_destinationType :: Lens' DescribePublishingDestinationResponse DestinationType
describePublishingDestinationResponse_destinationType = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribePublishingDestinationResponse' {DestinationType
destinationType :: DestinationType
$sel:destinationType:DescribePublishingDestinationResponse' :: DescribePublishingDestinationResponse -> DestinationType
destinationType} -> DestinationType
destinationType) (\s :: DescribePublishingDestinationResponse
s@DescribePublishingDestinationResponse' {} DestinationType
a -> DescribePublishingDestinationResponse
s {$sel:destinationType:DescribePublishingDestinationResponse' :: DestinationType
destinationType = DestinationType
a} :: DescribePublishingDestinationResponse)

-- | The status of the publishing destination.
describePublishingDestinationResponse_status :: Lens.Lens' DescribePublishingDestinationResponse PublishingStatus
describePublishingDestinationResponse_status :: Lens' DescribePublishingDestinationResponse PublishingStatus
describePublishingDestinationResponse_status = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribePublishingDestinationResponse' {PublishingStatus
status :: PublishingStatus
$sel:status:DescribePublishingDestinationResponse' :: DescribePublishingDestinationResponse -> PublishingStatus
status} -> PublishingStatus
status) (\s :: DescribePublishingDestinationResponse
s@DescribePublishingDestinationResponse' {} PublishingStatus
a -> DescribePublishingDestinationResponse
s {$sel:status:DescribePublishingDestinationResponse' :: PublishingStatus
status = PublishingStatus
a} :: DescribePublishingDestinationResponse)

-- | The time, in epoch millisecond format, at which GuardDuty was first
-- unable to publish findings to the destination.
describePublishingDestinationResponse_publishingFailureStartTimestamp :: Lens.Lens' DescribePublishingDestinationResponse Prelude.Integer
describePublishingDestinationResponse_publishingFailureStartTimestamp :: Lens' DescribePublishingDestinationResponse Integer
describePublishingDestinationResponse_publishingFailureStartTimestamp = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribePublishingDestinationResponse' {Integer
publishingFailureStartTimestamp :: Integer
$sel:publishingFailureStartTimestamp:DescribePublishingDestinationResponse' :: DescribePublishingDestinationResponse -> Integer
publishingFailureStartTimestamp} -> Integer
publishingFailureStartTimestamp) (\s :: DescribePublishingDestinationResponse
s@DescribePublishingDestinationResponse' {} Integer
a -> DescribePublishingDestinationResponse
s {$sel:publishingFailureStartTimestamp:DescribePublishingDestinationResponse' :: Integer
publishingFailureStartTimestamp = Integer
a} :: DescribePublishingDestinationResponse)

-- | A @DestinationProperties@ object that includes the @DestinationArn@ and
-- @KmsKeyArn@ of the publishing destination.
describePublishingDestinationResponse_destinationProperties :: Lens.Lens' DescribePublishingDestinationResponse DestinationProperties
describePublishingDestinationResponse_destinationProperties :: Lens' DescribePublishingDestinationResponse DestinationProperties
describePublishingDestinationResponse_destinationProperties = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribePublishingDestinationResponse' {DestinationProperties
destinationProperties :: DestinationProperties
$sel:destinationProperties:DescribePublishingDestinationResponse' :: DescribePublishingDestinationResponse -> DestinationProperties
destinationProperties} -> DestinationProperties
destinationProperties) (\s :: DescribePublishingDestinationResponse
s@DescribePublishingDestinationResponse' {} DestinationProperties
a -> DescribePublishingDestinationResponse
s {$sel:destinationProperties:DescribePublishingDestinationResponse' :: DestinationProperties
destinationProperties = DestinationProperties
a} :: DescribePublishingDestinationResponse)

instance
  Prelude.NFData
    DescribePublishingDestinationResponse
  where
  rnf :: DescribePublishingDestinationResponse -> ()
rnf DescribePublishingDestinationResponse' {Int
Integer
Text
DestinationProperties
DestinationType
PublishingStatus
destinationProperties :: DestinationProperties
publishingFailureStartTimestamp :: Integer
status :: PublishingStatus
destinationType :: DestinationType
destinationId :: Text
httpStatus :: Int
$sel:destinationProperties:DescribePublishingDestinationResponse' :: DescribePublishingDestinationResponse -> DestinationProperties
$sel:publishingFailureStartTimestamp:DescribePublishingDestinationResponse' :: DescribePublishingDestinationResponse -> Integer
$sel:status:DescribePublishingDestinationResponse' :: DescribePublishingDestinationResponse -> PublishingStatus
$sel:destinationType:DescribePublishingDestinationResponse' :: DescribePublishingDestinationResponse -> DestinationType
$sel:destinationId:DescribePublishingDestinationResponse' :: DescribePublishingDestinationResponse -> Text
$sel:httpStatus:DescribePublishingDestinationResponse' :: DescribePublishingDestinationResponse -> Int
..} =
    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 Text
destinationId
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf DestinationType
destinationType
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf PublishingStatus
status
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Integer
publishingFailureStartTimestamp
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf DestinationProperties
destinationProperties