{-# 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.Firehose.Types.HttpEndpointDestinationDescription
-- 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.Firehose.Types.HttpEndpointDestinationDescription where

import qualified Amazonka.Core as Core
import qualified Amazonka.Core.Lens.Internal as Lens
import qualified Amazonka.Data as Data
import Amazonka.Firehose.Types.CloudWatchLoggingOptions
import Amazonka.Firehose.Types.HttpEndpointBufferingHints
import Amazonka.Firehose.Types.HttpEndpointDescription
import Amazonka.Firehose.Types.HttpEndpointRequestConfiguration
import Amazonka.Firehose.Types.HttpEndpointRetryOptions
import Amazonka.Firehose.Types.HttpEndpointS3BackupMode
import Amazonka.Firehose.Types.ProcessingConfiguration
import Amazonka.Firehose.Types.S3DestinationDescription
import qualified Amazonka.Prelude as Prelude

-- | Describes the HTTP endpoint destination.
--
-- /See:/ 'newHttpEndpointDestinationDescription' smart constructor.
data HttpEndpointDestinationDescription = HttpEndpointDestinationDescription'
  { -- | Describes buffering options that can be applied to the data before it is
    -- delivered to the HTTPS endpoint destination. Kinesis Data Firehose teats
    -- these options as hints, and it might choose to use more optimal values.
    -- The @SizeInMBs@ and @IntervalInSeconds@ parameters are optional.
    -- However, if specify a value for one of them, you must also provide a
    -- value for the other.
    HttpEndpointDestinationDescription
-> Maybe HttpEndpointBufferingHints
bufferingHints :: Prelude.Maybe HttpEndpointBufferingHints,
    HttpEndpointDestinationDescription
-> Maybe CloudWatchLoggingOptions
cloudWatchLoggingOptions :: Prelude.Maybe CloudWatchLoggingOptions,
    -- | The configuration of the specified HTTP endpoint destination.
    HttpEndpointDestinationDescription -> Maybe HttpEndpointDescription
endpointConfiguration :: Prelude.Maybe HttpEndpointDescription,
    HttpEndpointDestinationDescription -> Maybe ProcessingConfiguration
processingConfiguration :: Prelude.Maybe ProcessingConfiguration,
    -- | The configuration of request sent to the HTTP endpoint specified as the
    -- destination.
    HttpEndpointDestinationDescription
-> Maybe HttpEndpointRequestConfiguration
requestConfiguration :: Prelude.Maybe HttpEndpointRequestConfiguration,
    -- | Describes the retry behavior in case Kinesis Data Firehose is unable to
    -- deliver data to the specified HTTP endpoint destination, or if it
    -- doesn\'t receive a valid acknowledgment of receipt from the specified
    -- HTTP endpoint destination.
    HttpEndpointDestinationDescription
-> Maybe HttpEndpointRetryOptions
retryOptions :: Prelude.Maybe HttpEndpointRetryOptions,
    -- | Kinesis Data Firehose uses this IAM role for all the permissions that
    -- the delivery stream needs.
    HttpEndpointDestinationDescription -> Maybe Text
roleARN :: Prelude.Maybe Prelude.Text,
    -- | Describes the S3 bucket backup options for the data that Kinesis
    -- Firehose delivers to the HTTP endpoint destination. You can back up all
    -- documents (@AllData@) or only the documents that Kinesis Data Firehose
    -- could not deliver to the specified HTTP endpoint destination
    -- (@FailedDataOnly@).
    HttpEndpointDestinationDescription
-> Maybe HttpEndpointS3BackupMode
s3BackupMode :: Prelude.Maybe HttpEndpointS3BackupMode,
    HttpEndpointDestinationDescription
-> Maybe S3DestinationDescription
s3DestinationDescription :: Prelude.Maybe S3DestinationDescription
  }
  deriving (HttpEndpointDestinationDescription
-> HttpEndpointDestinationDescription -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: HttpEndpointDestinationDescription
-> HttpEndpointDestinationDescription -> Bool
$c/= :: HttpEndpointDestinationDescription
-> HttpEndpointDestinationDescription -> Bool
== :: HttpEndpointDestinationDescription
-> HttpEndpointDestinationDescription -> Bool
$c== :: HttpEndpointDestinationDescription
-> HttpEndpointDestinationDescription -> Bool
Prelude.Eq, Int -> HttpEndpointDestinationDescription -> ShowS
[HttpEndpointDestinationDescription] -> ShowS
HttpEndpointDestinationDescription -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [HttpEndpointDestinationDescription] -> ShowS
$cshowList :: [HttpEndpointDestinationDescription] -> ShowS
show :: HttpEndpointDestinationDescription -> String
$cshow :: HttpEndpointDestinationDescription -> String
showsPrec :: Int -> HttpEndpointDestinationDescription -> ShowS
$cshowsPrec :: Int -> HttpEndpointDestinationDescription -> ShowS
Prelude.Show, forall x.
Rep HttpEndpointDestinationDescription x
-> HttpEndpointDestinationDescription
forall x.
HttpEndpointDestinationDescription
-> Rep HttpEndpointDestinationDescription x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep HttpEndpointDestinationDescription x
-> HttpEndpointDestinationDescription
$cfrom :: forall x.
HttpEndpointDestinationDescription
-> Rep HttpEndpointDestinationDescription x
Prelude.Generic)

-- |
-- Create a value of 'HttpEndpointDestinationDescription' 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:
--
-- 'bufferingHints', 'httpEndpointDestinationDescription_bufferingHints' - Describes buffering options that can be applied to the data before it is
-- delivered to the HTTPS endpoint destination. Kinesis Data Firehose teats
-- these options as hints, and it might choose to use more optimal values.
-- The @SizeInMBs@ and @IntervalInSeconds@ parameters are optional.
-- However, if specify a value for one of them, you must also provide a
-- value for the other.
--
-- 'cloudWatchLoggingOptions', 'httpEndpointDestinationDescription_cloudWatchLoggingOptions' - Undocumented member.
--
-- 'endpointConfiguration', 'httpEndpointDestinationDescription_endpointConfiguration' - The configuration of the specified HTTP endpoint destination.
--
-- 'processingConfiguration', 'httpEndpointDestinationDescription_processingConfiguration' - Undocumented member.
--
-- 'requestConfiguration', 'httpEndpointDestinationDescription_requestConfiguration' - The configuration of request sent to the HTTP endpoint specified as the
-- destination.
--
-- 'retryOptions', 'httpEndpointDestinationDescription_retryOptions' - Describes the retry behavior in case Kinesis Data Firehose is unable to
-- deliver data to the specified HTTP endpoint destination, or if it
-- doesn\'t receive a valid acknowledgment of receipt from the specified
-- HTTP endpoint destination.
--
-- 'roleARN', 'httpEndpointDestinationDescription_roleARN' - Kinesis Data Firehose uses this IAM role for all the permissions that
-- the delivery stream needs.
--
-- 's3BackupMode', 'httpEndpointDestinationDescription_s3BackupMode' - Describes the S3 bucket backup options for the data that Kinesis
-- Firehose delivers to the HTTP endpoint destination. You can back up all
-- documents (@AllData@) or only the documents that Kinesis Data Firehose
-- could not deliver to the specified HTTP endpoint destination
-- (@FailedDataOnly@).
--
-- 's3DestinationDescription', 'httpEndpointDestinationDescription_s3DestinationDescription' - Undocumented member.
newHttpEndpointDestinationDescription ::
  HttpEndpointDestinationDescription
newHttpEndpointDestinationDescription :: HttpEndpointDestinationDescription
newHttpEndpointDestinationDescription =
  HttpEndpointDestinationDescription'
    { $sel:bufferingHints:HttpEndpointDestinationDescription' :: Maybe HttpEndpointBufferingHints
bufferingHints =
        forall a. Maybe a
Prelude.Nothing,
      $sel:cloudWatchLoggingOptions:HttpEndpointDestinationDescription' :: Maybe CloudWatchLoggingOptions
cloudWatchLoggingOptions =
        forall a. Maybe a
Prelude.Nothing,
      $sel:endpointConfiguration:HttpEndpointDestinationDescription' :: Maybe HttpEndpointDescription
endpointConfiguration = forall a. Maybe a
Prelude.Nothing,
      $sel:processingConfiguration:HttpEndpointDestinationDescription' :: Maybe ProcessingConfiguration
processingConfiguration =
        forall a. Maybe a
Prelude.Nothing,
      $sel:requestConfiguration:HttpEndpointDestinationDescription' :: Maybe HttpEndpointRequestConfiguration
requestConfiguration = forall a. Maybe a
Prelude.Nothing,
      $sel:retryOptions:HttpEndpointDestinationDescription' :: Maybe HttpEndpointRetryOptions
retryOptions = forall a. Maybe a
Prelude.Nothing,
      $sel:roleARN:HttpEndpointDestinationDescription' :: Maybe Text
roleARN = forall a. Maybe a
Prelude.Nothing,
      $sel:s3BackupMode:HttpEndpointDestinationDescription' :: Maybe HttpEndpointS3BackupMode
s3BackupMode = forall a. Maybe a
Prelude.Nothing,
      $sel:s3DestinationDescription:HttpEndpointDestinationDescription' :: Maybe S3DestinationDescription
s3DestinationDescription =
        forall a. Maybe a
Prelude.Nothing
    }

-- | Describes buffering options that can be applied to the data before it is
-- delivered to the HTTPS endpoint destination. Kinesis Data Firehose teats
-- these options as hints, and it might choose to use more optimal values.
-- The @SizeInMBs@ and @IntervalInSeconds@ parameters are optional.
-- However, if specify a value for one of them, you must also provide a
-- value for the other.
httpEndpointDestinationDescription_bufferingHints :: Lens.Lens' HttpEndpointDestinationDescription (Prelude.Maybe HttpEndpointBufferingHints)
httpEndpointDestinationDescription_bufferingHints :: Lens'
  HttpEndpointDestinationDescription
  (Maybe HttpEndpointBufferingHints)
httpEndpointDestinationDescription_bufferingHints = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\HttpEndpointDestinationDescription' {Maybe HttpEndpointBufferingHints
bufferingHints :: Maybe HttpEndpointBufferingHints
$sel:bufferingHints:HttpEndpointDestinationDescription' :: HttpEndpointDestinationDescription
-> Maybe HttpEndpointBufferingHints
bufferingHints} -> Maybe HttpEndpointBufferingHints
bufferingHints) (\s :: HttpEndpointDestinationDescription
s@HttpEndpointDestinationDescription' {} Maybe HttpEndpointBufferingHints
a -> HttpEndpointDestinationDescription
s {$sel:bufferingHints:HttpEndpointDestinationDescription' :: Maybe HttpEndpointBufferingHints
bufferingHints = Maybe HttpEndpointBufferingHints
a} :: HttpEndpointDestinationDescription)

-- | Undocumented member.
httpEndpointDestinationDescription_cloudWatchLoggingOptions :: Lens.Lens' HttpEndpointDestinationDescription (Prelude.Maybe CloudWatchLoggingOptions)
httpEndpointDestinationDescription_cloudWatchLoggingOptions :: Lens'
  HttpEndpointDestinationDescription (Maybe CloudWatchLoggingOptions)
httpEndpointDestinationDescription_cloudWatchLoggingOptions = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\HttpEndpointDestinationDescription' {Maybe CloudWatchLoggingOptions
cloudWatchLoggingOptions :: Maybe CloudWatchLoggingOptions
$sel:cloudWatchLoggingOptions:HttpEndpointDestinationDescription' :: HttpEndpointDestinationDescription
-> Maybe CloudWatchLoggingOptions
cloudWatchLoggingOptions} -> Maybe CloudWatchLoggingOptions
cloudWatchLoggingOptions) (\s :: HttpEndpointDestinationDescription
s@HttpEndpointDestinationDescription' {} Maybe CloudWatchLoggingOptions
a -> HttpEndpointDestinationDescription
s {$sel:cloudWatchLoggingOptions:HttpEndpointDestinationDescription' :: Maybe CloudWatchLoggingOptions
cloudWatchLoggingOptions = Maybe CloudWatchLoggingOptions
a} :: HttpEndpointDestinationDescription)

-- | The configuration of the specified HTTP endpoint destination.
httpEndpointDestinationDescription_endpointConfiguration :: Lens.Lens' HttpEndpointDestinationDescription (Prelude.Maybe HttpEndpointDescription)
httpEndpointDestinationDescription_endpointConfiguration :: Lens'
  HttpEndpointDestinationDescription (Maybe HttpEndpointDescription)
httpEndpointDestinationDescription_endpointConfiguration = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\HttpEndpointDestinationDescription' {Maybe HttpEndpointDescription
endpointConfiguration :: Maybe HttpEndpointDescription
$sel:endpointConfiguration:HttpEndpointDestinationDescription' :: HttpEndpointDestinationDescription -> Maybe HttpEndpointDescription
endpointConfiguration} -> Maybe HttpEndpointDescription
endpointConfiguration) (\s :: HttpEndpointDestinationDescription
s@HttpEndpointDestinationDescription' {} Maybe HttpEndpointDescription
a -> HttpEndpointDestinationDescription
s {$sel:endpointConfiguration:HttpEndpointDestinationDescription' :: Maybe HttpEndpointDescription
endpointConfiguration = Maybe HttpEndpointDescription
a} :: HttpEndpointDestinationDescription)

-- | Undocumented member.
httpEndpointDestinationDescription_processingConfiguration :: Lens.Lens' HttpEndpointDestinationDescription (Prelude.Maybe ProcessingConfiguration)
httpEndpointDestinationDescription_processingConfiguration :: Lens'
  HttpEndpointDestinationDescription (Maybe ProcessingConfiguration)
httpEndpointDestinationDescription_processingConfiguration = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\HttpEndpointDestinationDescription' {Maybe ProcessingConfiguration
processingConfiguration :: Maybe ProcessingConfiguration
$sel:processingConfiguration:HttpEndpointDestinationDescription' :: HttpEndpointDestinationDescription -> Maybe ProcessingConfiguration
processingConfiguration} -> Maybe ProcessingConfiguration
processingConfiguration) (\s :: HttpEndpointDestinationDescription
s@HttpEndpointDestinationDescription' {} Maybe ProcessingConfiguration
a -> HttpEndpointDestinationDescription
s {$sel:processingConfiguration:HttpEndpointDestinationDescription' :: Maybe ProcessingConfiguration
processingConfiguration = Maybe ProcessingConfiguration
a} :: HttpEndpointDestinationDescription)

-- | The configuration of request sent to the HTTP endpoint specified as the
-- destination.
httpEndpointDestinationDescription_requestConfiguration :: Lens.Lens' HttpEndpointDestinationDescription (Prelude.Maybe HttpEndpointRequestConfiguration)
httpEndpointDestinationDescription_requestConfiguration :: Lens'
  HttpEndpointDestinationDescription
  (Maybe HttpEndpointRequestConfiguration)
httpEndpointDestinationDescription_requestConfiguration = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\HttpEndpointDestinationDescription' {Maybe HttpEndpointRequestConfiguration
requestConfiguration :: Maybe HttpEndpointRequestConfiguration
$sel:requestConfiguration:HttpEndpointDestinationDescription' :: HttpEndpointDestinationDescription
-> Maybe HttpEndpointRequestConfiguration
requestConfiguration} -> Maybe HttpEndpointRequestConfiguration
requestConfiguration) (\s :: HttpEndpointDestinationDescription
s@HttpEndpointDestinationDescription' {} Maybe HttpEndpointRequestConfiguration
a -> HttpEndpointDestinationDescription
s {$sel:requestConfiguration:HttpEndpointDestinationDescription' :: Maybe HttpEndpointRequestConfiguration
requestConfiguration = Maybe HttpEndpointRequestConfiguration
a} :: HttpEndpointDestinationDescription)

-- | Describes the retry behavior in case Kinesis Data Firehose is unable to
-- deliver data to the specified HTTP endpoint destination, or if it
-- doesn\'t receive a valid acknowledgment of receipt from the specified
-- HTTP endpoint destination.
httpEndpointDestinationDescription_retryOptions :: Lens.Lens' HttpEndpointDestinationDescription (Prelude.Maybe HttpEndpointRetryOptions)
httpEndpointDestinationDescription_retryOptions :: Lens'
  HttpEndpointDestinationDescription (Maybe HttpEndpointRetryOptions)
httpEndpointDestinationDescription_retryOptions = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\HttpEndpointDestinationDescription' {Maybe HttpEndpointRetryOptions
retryOptions :: Maybe HttpEndpointRetryOptions
$sel:retryOptions:HttpEndpointDestinationDescription' :: HttpEndpointDestinationDescription
-> Maybe HttpEndpointRetryOptions
retryOptions} -> Maybe HttpEndpointRetryOptions
retryOptions) (\s :: HttpEndpointDestinationDescription
s@HttpEndpointDestinationDescription' {} Maybe HttpEndpointRetryOptions
a -> HttpEndpointDestinationDescription
s {$sel:retryOptions:HttpEndpointDestinationDescription' :: Maybe HttpEndpointRetryOptions
retryOptions = Maybe HttpEndpointRetryOptions
a} :: HttpEndpointDestinationDescription)

-- | Kinesis Data Firehose uses this IAM role for all the permissions that
-- the delivery stream needs.
httpEndpointDestinationDescription_roleARN :: Lens.Lens' HttpEndpointDestinationDescription (Prelude.Maybe Prelude.Text)
httpEndpointDestinationDescription_roleARN :: Lens' HttpEndpointDestinationDescription (Maybe Text)
httpEndpointDestinationDescription_roleARN = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\HttpEndpointDestinationDescription' {Maybe Text
roleARN :: Maybe Text
$sel:roleARN:HttpEndpointDestinationDescription' :: HttpEndpointDestinationDescription -> Maybe Text
roleARN} -> Maybe Text
roleARN) (\s :: HttpEndpointDestinationDescription
s@HttpEndpointDestinationDescription' {} Maybe Text
a -> HttpEndpointDestinationDescription
s {$sel:roleARN:HttpEndpointDestinationDescription' :: Maybe Text
roleARN = Maybe Text
a} :: HttpEndpointDestinationDescription)

-- | Describes the S3 bucket backup options for the data that Kinesis
-- Firehose delivers to the HTTP endpoint destination. You can back up all
-- documents (@AllData@) or only the documents that Kinesis Data Firehose
-- could not deliver to the specified HTTP endpoint destination
-- (@FailedDataOnly@).
httpEndpointDestinationDescription_s3BackupMode :: Lens.Lens' HttpEndpointDestinationDescription (Prelude.Maybe HttpEndpointS3BackupMode)
httpEndpointDestinationDescription_s3BackupMode :: Lens'
  HttpEndpointDestinationDescription (Maybe HttpEndpointS3BackupMode)
httpEndpointDestinationDescription_s3BackupMode = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\HttpEndpointDestinationDescription' {Maybe HttpEndpointS3BackupMode
s3BackupMode :: Maybe HttpEndpointS3BackupMode
$sel:s3BackupMode:HttpEndpointDestinationDescription' :: HttpEndpointDestinationDescription
-> Maybe HttpEndpointS3BackupMode
s3BackupMode} -> Maybe HttpEndpointS3BackupMode
s3BackupMode) (\s :: HttpEndpointDestinationDescription
s@HttpEndpointDestinationDescription' {} Maybe HttpEndpointS3BackupMode
a -> HttpEndpointDestinationDescription
s {$sel:s3BackupMode:HttpEndpointDestinationDescription' :: Maybe HttpEndpointS3BackupMode
s3BackupMode = Maybe HttpEndpointS3BackupMode
a} :: HttpEndpointDestinationDescription)

-- | Undocumented member.
httpEndpointDestinationDescription_s3DestinationDescription :: Lens.Lens' HttpEndpointDestinationDescription (Prelude.Maybe S3DestinationDescription)
httpEndpointDestinationDescription_s3DestinationDescription :: Lens'
  HttpEndpointDestinationDescription (Maybe S3DestinationDescription)
httpEndpointDestinationDescription_s3DestinationDescription = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\HttpEndpointDestinationDescription' {Maybe S3DestinationDescription
s3DestinationDescription :: Maybe S3DestinationDescription
$sel:s3DestinationDescription:HttpEndpointDestinationDescription' :: HttpEndpointDestinationDescription
-> Maybe S3DestinationDescription
s3DestinationDescription} -> Maybe S3DestinationDescription
s3DestinationDescription) (\s :: HttpEndpointDestinationDescription
s@HttpEndpointDestinationDescription' {} Maybe S3DestinationDescription
a -> HttpEndpointDestinationDescription
s {$sel:s3DestinationDescription:HttpEndpointDestinationDescription' :: Maybe S3DestinationDescription
s3DestinationDescription = Maybe S3DestinationDescription
a} :: HttpEndpointDestinationDescription)

instance
  Data.FromJSON
    HttpEndpointDestinationDescription
  where
  parseJSON :: Value -> Parser HttpEndpointDestinationDescription
parseJSON =
    forall a. String -> (Object -> Parser a) -> Value -> Parser a
Data.withObject
      String
"HttpEndpointDestinationDescription"
      ( \Object
x ->
          Maybe HttpEndpointBufferingHints
-> Maybe CloudWatchLoggingOptions
-> Maybe HttpEndpointDescription
-> Maybe ProcessingConfiguration
-> Maybe HttpEndpointRequestConfiguration
-> Maybe HttpEndpointRetryOptions
-> Maybe Text
-> Maybe HttpEndpointS3BackupMode
-> Maybe S3DestinationDescription
-> HttpEndpointDestinationDescription
HttpEndpointDestinationDescription'
            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
"BufferingHints")
            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
"CloudWatchLoggingOptions")
            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
"EndpointConfiguration")
            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
"ProcessingConfiguration")
            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
"RequestConfiguration")
            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
"RetryOptions")
            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
"RoleARN")
            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
"S3BackupMode")
            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
"S3DestinationDescription")
      )

instance
  Prelude.Hashable
    HttpEndpointDestinationDescription
  where
  hashWithSalt :: Int -> HttpEndpointDestinationDescription -> Int
hashWithSalt
    Int
_salt
    HttpEndpointDestinationDescription' {Maybe Text
Maybe CloudWatchLoggingOptions
Maybe HttpEndpointBufferingHints
Maybe HttpEndpointDescription
Maybe HttpEndpointRequestConfiguration
Maybe HttpEndpointRetryOptions
Maybe HttpEndpointS3BackupMode
Maybe ProcessingConfiguration
Maybe S3DestinationDescription
s3DestinationDescription :: Maybe S3DestinationDescription
s3BackupMode :: Maybe HttpEndpointS3BackupMode
roleARN :: Maybe Text
retryOptions :: Maybe HttpEndpointRetryOptions
requestConfiguration :: Maybe HttpEndpointRequestConfiguration
processingConfiguration :: Maybe ProcessingConfiguration
endpointConfiguration :: Maybe HttpEndpointDescription
cloudWatchLoggingOptions :: Maybe CloudWatchLoggingOptions
bufferingHints :: Maybe HttpEndpointBufferingHints
$sel:s3DestinationDescription:HttpEndpointDestinationDescription' :: HttpEndpointDestinationDescription
-> Maybe S3DestinationDescription
$sel:s3BackupMode:HttpEndpointDestinationDescription' :: HttpEndpointDestinationDescription
-> Maybe HttpEndpointS3BackupMode
$sel:roleARN:HttpEndpointDestinationDescription' :: HttpEndpointDestinationDescription -> Maybe Text
$sel:retryOptions:HttpEndpointDestinationDescription' :: HttpEndpointDestinationDescription
-> Maybe HttpEndpointRetryOptions
$sel:requestConfiguration:HttpEndpointDestinationDescription' :: HttpEndpointDestinationDescription
-> Maybe HttpEndpointRequestConfiguration
$sel:processingConfiguration:HttpEndpointDestinationDescription' :: HttpEndpointDestinationDescription -> Maybe ProcessingConfiguration
$sel:endpointConfiguration:HttpEndpointDestinationDescription' :: HttpEndpointDestinationDescription -> Maybe HttpEndpointDescription
$sel:cloudWatchLoggingOptions:HttpEndpointDestinationDescription' :: HttpEndpointDestinationDescription
-> Maybe CloudWatchLoggingOptions
$sel:bufferingHints:HttpEndpointDestinationDescription' :: HttpEndpointDestinationDescription
-> Maybe HttpEndpointBufferingHints
..} =
      Int
_salt
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe HttpEndpointBufferingHints
bufferingHints
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe CloudWatchLoggingOptions
cloudWatchLoggingOptions
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe HttpEndpointDescription
endpointConfiguration
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe ProcessingConfiguration
processingConfiguration
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe HttpEndpointRequestConfiguration
requestConfiguration
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe HttpEndpointRetryOptions
retryOptions
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
roleARN
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe HttpEndpointS3BackupMode
s3BackupMode
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe S3DestinationDescription
s3DestinationDescription

instance
  Prelude.NFData
    HttpEndpointDestinationDescription
  where
  rnf :: HttpEndpointDestinationDescription -> ()
rnf HttpEndpointDestinationDescription' {Maybe Text
Maybe CloudWatchLoggingOptions
Maybe HttpEndpointBufferingHints
Maybe HttpEndpointDescription
Maybe HttpEndpointRequestConfiguration
Maybe HttpEndpointRetryOptions
Maybe HttpEndpointS3BackupMode
Maybe ProcessingConfiguration
Maybe S3DestinationDescription
s3DestinationDescription :: Maybe S3DestinationDescription
s3BackupMode :: Maybe HttpEndpointS3BackupMode
roleARN :: Maybe Text
retryOptions :: Maybe HttpEndpointRetryOptions
requestConfiguration :: Maybe HttpEndpointRequestConfiguration
processingConfiguration :: Maybe ProcessingConfiguration
endpointConfiguration :: Maybe HttpEndpointDescription
cloudWatchLoggingOptions :: Maybe CloudWatchLoggingOptions
bufferingHints :: Maybe HttpEndpointBufferingHints
$sel:s3DestinationDescription:HttpEndpointDestinationDescription' :: HttpEndpointDestinationDescription
-> Maybe S3DestinationDescription
$sel:s3BackupMode:HttpEndpointDestinationDescription' :: HttpEndpointDestinationDescription
-> Maybe HttpEndpointS3BackupMode
$sel:roleARN:HttpEndpointDestinationDescription' :: HttpEndpointDestinationDescription -> Maybe Text
$sel:retryOptions:HttpEndpointDestinationDescription' :: HttpEndpointDestinationDescription
-> Maybe HttpEndpointRetryOptions
$sel:requestConfiguration:HttpEndpointDestinationDescription' :: HttpEndpointDestinationDescription
-> Maybe HttpEndpointRequestConfiguration
$sel:processingConfiguration:HttpEndpointDestinationDescription' :: HttpEndpointDestinationDescription -> Maybe ProcessingConfiguration
$sel:endpointConfiguration:HttpEndpointDestinationDescription' :: HttpEndpointDestinationDescription -> Maybe HttpEndpointDescription
$sel:cloudWatchLoggingOptions:HttpEndpointDestinationDescription' :: HttpEndpointDestinationDescription
-> Maybe CloudWatchLoggingOptions
$sel:bufferingHints:HttpEndpointDestinationDescription' :: HttpEndpointDestinationDescription
-> Maybe HttpEndpointBufferingHints
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe HttpEndpointBufferingHints
bufferingHints
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe CloudWatchLoggingOptions
cloudWatchLoggingOptions
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe HttpEndpointDescription
endpointConfiguration
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe ProcessingConfiguration
processingConfiguration
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe HttpEndpointRequestConfiguration
requestConfiguration
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe HttpEndpointRetryOptions
retryOptions
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
roleARN
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe HttpEndpointS3BackupMode
s3BackupMode
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe S3DestinationDescription
s3DestinationDescription