{-# 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.HttpEndpointDestinationUpdate
-- 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.HttpEndpointDestinationUpdate 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.HttpEndpointConfiguration
import Amazonka.Firehose.Types.HttpEndpointRequestConfiguration
import Amazonka.Firehose.Types.HttpEndpointRetryOptions
import Amazonka.Firehose.Types.HttpEndpointS3BackupMode
import Amazonka.Firehose.Types.ProcessingConfiguration
import Amazonka.Firehose.Types.S3DestinationUpdate
import qualified Amazonka.Prelude as Prelude

-- | Updates the specified HTTP endpoint destination.
--
-- /See:/ 'newHttpEndpointDestinationUpdate' smart constructor.
data HttpEndpointDestinationUpdate = HttpEndpointDestinationUpdate'
  { -- | 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.
    HttpEndpointDestinationUpdate -> Maybe HttpEndpointBufferingHints
bufferingHints :: Prelude.Maybe HttpEndpointBufferingHints,
    HttpEndpointDestinationUpdate -> Maybe CloudWatchLoggingOptions
cloudWatchLoggingOptions :: Prelude.Maybe CloudWatchLoggingOptions,
    -- | Describes the configuration of the HTTP endpoint destination.
    HttpEndpointDestinationUpdate -> Maybe HttpEndpointConfiguration
endpointConfiguration :: Prelude.Maybe HttpEndpointConfiguration,
    HttpEndpointDestinationUpdate -> Maybe ProcessingConfiguration
processingConfiguration :: Prelude.Maybe ProcessingConfiguration,
    -- | The configuration of the request sent to the HTTP endpoint specified as
    -- the destination.
    HttpEndpointDestinationUpdate
-> 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.
    HttpEndpointDestinationUpdate -> Maybe HttpEndpointRetryOptions
retryOptions :: Prelude.Maybe HttpEndpointRetryOptions,
    -- | Kinesis Data Firehose uses this IAM role for all the permissions that
    -- the delivery stream needs.
    HttpEndpointDestinationUpdate -> 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@).
    HttpEndpointDestinationUpdate -> Maybe HttpEndpointS3BackupMode
s3BackupMode :: Prelude.Maybe HttpEndpointS3BackupMode,
    HttpEndpointDestinationUpdate -> Maybe S3DestinationUpdate
s3Update :: Prelude.Maybe S3DestinationUpdate
  }
  deriving (HttpEndpointDestinationUpdate
-> HttpEndpointDestinationUpdate -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: HttpEndpointDestinationUpdate
-> HttpEndpointDestinationUpdate -> Bool
$c/= :: HttpEndpointDestinationUpdate
-> HttpEndpointDestinationUpdate -> Bool
== :: HttpEndpointDestinationUpdate
-> HttpEndpointDestinationUpdate -> Bool
$c== :: HttpEndpointDestinationUpdate
-> HttpEndpointDestinationUpdate -> Bool
Prelude.Eq, Int -> HttpEndpointDestinationUpdate -> ShowS
[HttpEndpointDestinationUpdate] -> ShowS
HttpEndpointDestinationUpdate -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [HttpEndpointDestinationUpdate] -> ShowS
$cshowList :: [HttpEndpointDestinationUpdate] -> ShowS
show :: HttpEndpointDestinationUpdate -> String
$cshow :: HttpEndpointDestinationUpdate -> String
showsPrec :: Int -> HttpEndpointDestinationUpdate -> ShowS
$cshowsPrec :: Int -> HttpEndpointDestinationUpdate -> ShowS
Prelude.Show, forall x.
Rep HttpEndpointDestinationUpdate x
-> HttpEndpointDestinationUpdate
forall x.
HttpEndpointDestinationUpdate
-> Rep HttpEndpointDestinationUpdate x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep HttpEndpointDestinationUpdate x
-> HttpEndpointDestinationUpdate
$cfrom :: forall x.
HttpEndpointDestinationUpdate
-> Rep HttpEndpointDestinationUpdate x
Prelude.Generic)

-- |
-- Create a value of 'HttpEndpointDestinationUpdate' 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', 'httpEndpointDestinationUpdate_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', 'httpEndpointDestinationUpdate_cloudWatchLoggingOptions' - Undocumented member.
--
-- 'endpointConfiguration', 'httpEndpointDestinationUpdate_endpointConfiguration' - Describes the configuration of the HTTP endpoint destination.
--
-- 'processingConfiguration', 'httpEndpointDestinationUpdate_processingConfiguration' - Undocumented member.
--
-- 'requestConfiguration', 'httpEndpointDestinationUpdate_requestConfiguration' - The configuration of the request sent to the HTTP endpoint specified as
-- the destination.
--
-- 'retryOptions', 'httpEndpointDestinationUpdate_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', 'httpEndpointDestinationUpdate_roleARN' - Kinesis Data Firehose uses this IAM role for all the permissions that
-- the delivery stream needs.
--
-- 's3BackupMode', 'httpEndpointDestinationUpdate_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@).
--
-- 's3Update', 'httpEndpointDestinationUpdate_s3Update' - Undocumented member.
newHttpEndpointDestinationUpdate ::
  HttpEndpointDestinationUpdate
newHttpEndpointDestinationUpdate :: HttpEndpointDestinationUpdate
newHttpEndpointDestinationUpdate =
  HttpEndpointDestinationUpdate'
    { $sel:bufferingHints:HttpEndpointDestinationUpdate' :: Maybe HttpEndpointBufferingHints
bufferingHints =
        forall a. Maybe a
Prelude.Nothing,
      $sel:cloudWatchLoggingOptions:HttpEndpointDestinationUpdate' :: Maybe CloudWatchLoggingOptions
cloudWatchLoggingOptions = forall a. Maybe a
Prelude.Nothing,
      $sel:endpointConfiguration:HttpEndpointDestinationUpdate' :: Maybe HttpEndpointConfiguration
endpointConfiguration = forall a. Maybe a
Prelude.Nothing,
      $sel:processingConfiguration:HttpEndpointDestinationUpdate' :: Maybe ProcessingConfiguration
processingConfiguration = forall a. Maybe a
Prelude.Nothing,
      $sel:requestConfiguration:HttpEndpointDestinationUpdate' :: Maybe HttpEndpointRequestConfiguration
requestConfiguration = forall a. Maybe a
Prelude.Nothing,
      $sel:retryOptions:HttpEndpointDestinationUpdate' :: Maybe HttpEndpointRetryOptions
retryOptions = forall a. Maybe a
Prelude.Nothing,
      $sel:roleARN:HttpEndpointDestinationUpdate' :: Maybe Text
roleARN = forall a. Maybe a
Prelude.Nothing,
      $sel:s3BackupMode:HttpEndpointDestinationUpdate' :: Maybe HttpEndpointS3BackupMode
s3BackupMode = forall a. Maybe a
Prelude.Nothing,
      $sel:s3Update:HttpEndpointDestinationUpdate' :: Maybe S3DestinationUpdate
s3Update = 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.
httpEndpointDestinationUpdate_bufferingHints :: Lens.Lens' HttpEndpointDestinationUpdate (Prelude.Maybe HttpEndpointBufferingHints)
httpEndpointDestinationUpdate_bufferingHints :: Lens'
  HttpEndpointDestinationUpdate (Maybe HttpEndpointBufferingHints)
httpEndpointDestinationUpdate_bufferingHints = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\HttpEndpointDestinationUpdate' {Maybe HttpEndpointBufferingHints
bufferingHints :: Maybe HttpEndpointBufferingHints
$sel:bufferingHints:HttpEndpointDestinationUpdate' :: HttpEndpointDestinationUpdate -> Maybe HttpEndpointBufferingHints
bufferingHints} -> Maybe HttpEndpointBufferingHints
bufferingHints) (\s :: HttpEndpointDestinationUpdate
s@HttpEndpointDestinationUpdate' {} Maybe HttpEndpointBufferingHints
a -> HttpEndpointDestinationUpdate
s {$sel:bufferingHints:HttpEndpointDestinationUpdate' :: Maybe HttpEndpointBufferingHints
bufferingHints = Maybe HttpEndpointBufferingHints
a} :: HttpEndpointDestinationUpdate)

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

-- | Describes the configuration of the HTTP endpoint destination.
httpEndpointDestinationUpdate_endpointConfiguration :: Lens.Lens' HttpEndpointDestinationUpdate (Prelude.Maybe HttpEndpointConfiguration)
httpEndpointDestinationUpdate_endpointConfiguration :: Lens'
  HttpEndpointDestinationUpdate (Maybe HttpEndpointConfiguration)
httpEndpointDestinationUpdate_endpointConfiguration = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\HttpEndpointDestinationUpdate' {Maybe HttpEndpointConfiguration
endpointConfiguration :: Maybe HttpEndpointConfiguration
$sel:endpointConfiguration:HttpEndpointDestinationUpdate' :: HttpEndpointDestinationUpdate -> Maybe HttpEndpointConfiguration
endpointConfiguration} -> Maybe HttpEndpointConfiguration
endpointConfiguration) (\s :: HttpEndpointDestinationUpdate
s@HttpEndpointDestinationUpdate' {} Maybe HttpEndpointConfiguration
a -> HttpEndpointDestinationUpdate
s {$sel:endpointConfiguration:HttpEndpointDestinationUpdate' :: Maybe HttpEndpointConfiguration
endpointConfiguration = Maybe HttpEndpointConfiguration
a} :: HttpEndpointDestinationUpdate)

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

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

-- | 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.
httpEndpointDestinationUpdate_retryOptions :: Lens.Lens' HttpEndpointDestinationUpdate (Prelude.Maybe HttpEndpointRetryOptions)
httpEndpointDestinationUpdate_retryOptions :: Lens'
  HttpEndpointDestinationUpdate (Maybe HttpEndpointRetryOptions)
httpEndpointDestinationUpdate_retryOptions = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\HttpEndpointDestinationUpdate' {Maybe HttpEndpointRetryOptions
retryOptions :: Maybe HttpEndpointRetryOptions
$sel:retryOptions:HttpEndpointDestinationUpdate' :: HttpEndpointDestinationUpdate -> Maybe HttpEndpointRetryOptions
retryOptions} -> Maybe HttpEndpointRetryOptions
retryOptions) (\s :: HttpEndpointDestinationUpdate
s@HttpEndpointDestinationUpdate' {} Maybe HttpEndpointRetryOptions
a -> HttpEndpointDestinationUpdate
s {$sel:retryOptions:HttpEndpointDestinationUpdate' :: Maybe HttpEndpointRetryOptions
retryOptions = Maybe HttpEndpointRetryOptions
a} :: HttpEndpointDestinationUpdate)

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

-- | 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@).
httpEndpointDestinationUpdate_s3BackupMode :: Lens.Lens' HttpEndpointDestinationUpdate (Prelude.Maybe HttpEndpointS3BackupMode)
httpEndpointDestinationUpdate_s3BackupMode :: Lens'
  HttpEndpointDestinationUpdate (Maybe HttpEndpointS3BackupMode)
httpEndpointDestinationUpdate_s3BackupMode = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\HttpEndpointDestinationUpdate' {Maybe HttpEndpointS3BackupMode
s3BackupMode :: Maybe HttpEndpointS3BackupMode
$sel:s3BackupMode:HttpEndpointDestinationUpdate' :: HttpEndpointDestinationUpdate -> Maybe HttpEndpointS3BackupMode
s3BackupMode} -> Maybe HttpEndpointS3BackupMode
s3BackupMode) (\s :: HttpEndpointDestinationUpdate
s@HttpEndpointDestinationUpdate' {} Maybe HttpEndpointS3BackupMode
a -> HttpEndpointDestinationUpdate
s {$sel:s3BackupMode:HttpEndpointDestinationUpdate' :: Maybe HttpEndpointS3BackupMode
s3BackupMode = Maybe HttpEndpointS3BackupMode
a} :: HttpEndpointDestinationUpdate)

-- | Undocumented member.
httpEndpointDestinationUpdate_s3Update :: Lens.Lens' HttpEndpointDestinationUpdate (Prelude.Maybe S3DestinationUpdate)
httpEndpointDestinationUpdate_s3Update :: Lens' HttpEndpointDestinationUpdate (Maybe S3DestinationUpdate)
httpEndpointDestinationUpdate_s3Update = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\HttpEndpointDestinationUpdate' {Maybe S3DestinationUpdate
s3Update :: Maybe S3DestinationUpdate
$sel:s3Update:HttpEndpointDestinationUpdate' :: HttpEndpointDestinationUpdate -> Maybe S3DestinationUpdate
s3Update} -> Maybe S3DestinationUpdate
s3Update) (\s :: HttpEndpointDestinationUpdate
s@HttpEndpointDestinationUpdate' {} Maybe S3DestinationUpdate
a -> HttpEndpointDestinationUpdate
s {$sel:s3Update:HttpEndpointDestinationUpdate' :: Maybe S3DestinationUpdate
s3Update = Maybe S3DestinationUpdate
a} :: HttpEndpointDestinationUpdate)

instance
  Prelude.Hashable
    HttpEndpointDestinationUpdate
  where
  hashWithSalt :: Int -> HttpEndpointDestinationUpdate -> Int
hashWithSalt Int
_salt HttpEndpointDestinationUpdate' {Maybe Text
Maybe CloudWatchLoggingOptions
Maybe HttpEndpointBufferingHints
Maybe HttpEndpointConfiguration
Maybe HttpEndpointRequestConfiguration
Maybe HttpEndpointRetryOptions
Maybe HttpEndpointS3BackupMode
Maybe ProcessingConfiguration
Maybe S3DestinationUpdate
s3Update :: Maybe S3DestinationUpdate
s3BackupMode :: Maybe HttpEndpointS3BackupMode
roleARN :: Maybe Text
retryOptions :: Maybe HttpEndpointRetryOptions
requestConfiguration :: Maybe HttpEndpointRequestConfiguration
processingConfiguration :: Maybe ProcessingConfiguration
endpointConfiguration :: Maybe HttpEndpointConfiguration
cloudWatchLoggingOptions :: Maybe CloudWatchLoggingOptions
bufferingHints :: Maybe HttpEndpointBufferingHints
$sel:s3Update:HttpEndpointDestinationUpdate' :: HttpEndpointDestinationUpdate -> Maybe S3DestinationUpdate
$sel:s3BackupMode:HttpEndpointDestinationUpdate' :: HttpEndpointDestinationUpdate -> Maybe HttpEndpointS3BackupMode
$sel:roleARN:HttpEndpointDestinationUpdate' :: HttpEndpointDestinationUpdate -> Maybe Text
$sel:retryOptions:HttpEndpointDestinationUpdate' :: HttpEndpointDestinationUpdate -> Maybe HttpEndpointRetryOptions
$sel:requestConfiguration:HttpEndpointDestinationUpdate' :: HttpEndpointDestinationUpdate
-> Maybe HttpEndpointRequestConfiguration
$sel:processingConfiguration:HttpEndpointDestinationUpdate' :: HttpEndpointDestinationUpdate -> Maybe ProcessingConfiguration
$sel:endpointConfiguration:HttpEndpointDestinationUpdate' :: HttpEndpointDestinationUpdate -> Maybe HttpEndpointConfiguration
$sel:cloudWatchLoggingOptions:HttpEndpointDestinationUpdate' :: HttpEndpointDestinationUpdate -> Maybe CloudWatchLoggingOptions
$sel:bufferingHints:HttpEndpointDestinationUpdate' :: HttpEndpointDestinationUpdate -> 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 HttpEndpointConfiguration
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 S3DestinationUpdate
s3Update

instance Prelude.NFData HttpEndpointDestinationUpdate where
  rnf :: HttpEndpointDestinationUpdate -> ()
rnf HttpEndpointDestinationUpdate' {Maybe Text
Maybe CloudWatchLoggingOptions
Maybe HttpEndpointBufferingHints
Maybe HttpEndpointConfiguration
Maybe HttpEndpointRequestConfiguration
Maybe HttpEndpointRetryOptions
Maybe HttpEndpointS3BackupMode
Maybe ProcessingConfiguration
Maybe S3DestinationUpdate
s3Update :: Maybe S3DestinationUpdate
s3BackupMode :: Maybe HttpEndpointS3BackupMode
roleARN :: Maybe Text
retryOptions :: Maybe HttpEndpointRetryOptions
requestConfiguration :: Maybe HttpEndpointRequestConfiguration
processingConfiguration :: Maybe ProcessingConfiguration
endpointConfiguration :: Maybe HttpEndpointConfiguration
cloudWatchLoggingOptions :: Maybe CloudWatchLoggingOptions
bufferingHints :: Maybe HttpEndpointBufferingHints
$sel:s3Update:HttpEndpointDestinationUpdate' :: HttpEndpointDestinationUpdate -> Maybe S3DestinationUpdate
$sel:s3BackupMode:HttpEndpointDestinationUpdate' :: HttpEndpointDestinationUpdate -> Maybe HttpEndpointS3BackupMode
$sel:roleARN:HttpEndpointDestinationUpdate' :: HttpEndpointDestinationUpdate -> Maybe Text
$sel:retryOptions:HttpEndpointDestinationUpdate' :: HttpEndpointDestinationUpdate -> Maybe HttpEndpointRetryOptions
$sel:requestConfiguration:HttpEndpointDestinationUpdate' :: HttpEndpointDestinationUpdate
-> Maybe HttpEndpointRequestConfiguration
$sel:processingConfiguration:HttpEndpointDestinationUpdate' :: HttpEndpointDestinationUpdate -> Maybe ProcessingConfiguration
$sel:endpointConfiguration:HttpEndpointDestinationUpdate' :: HttpEndpointDestinationUpdate -> Maybe HttpEndpointConfiguration
$sel:cloudWatchLoggingOptions:HttpEndpointDestinationUpdate' :: HttpEndpointDestinationUpdate -> Maybe CloudWatchLoggingOptions
$sel:bufferingHints:HttpEndpointDestinationUpdate' :: HttpEndpointDestinationUpdate -> 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 HttpEndpointConfiguration
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 S3DestinationUpdate
s3Update

instance Data.ToJSON HttpEndpointDestinationUpdate where
  toJSON :: HttpEndpointDestinationUpdate -> Value
toJSON HttpEndpointDestinationUpdate' {Maybe Text
Maybe CloudWatchLoggingOptions
Maybe HttpEndpointBufferingHints
Maybe HttpEndpointConfiguration
Maybe HttpEndpointRequestConfiguration
Maybe HttpEndpointRetryOptions
Maybe HttpEndpointS3BackupMode
Maybe ProcessingConfiguration
Maybe S3DestinationUpdate
s3Update :: Maybe S3DestinationUpdate
s3BackupMode :: Maybe HttpEndpointS3BackupMode
roleARN :: Maybe Text
retryOptions :: Maybe HttpEndpointRetryOptions
requestConfiguration :: Maybe HttpEndpointRequestConfiguration
processingConfiguration :: Maybe ProcessingConfiguration
endpointConfiguration :: Maybe HttpEndpointConfiguration
cloudWatchLoggingOptions :: Maybe CloudWatchLoggingOptions
bufferingHints :: Maybe HttpEndpointBufferingHints
$sel:s3Update:HttpEndpointDestinationUpdate' :: HttpEndpointDestinationUpdate -> Maybe S3DestinationUpdate
$sel:s3BackupMode:HttpEndpointDestinationUpdate' :: HttpEndpointDestinationUpdate -> Maybe HttpEndpointS3BackupMode
$sel:roleARN:HttpEndpointDestinationUpdate' :: HttpEndpointDestinationUpdate -> Maybe Text
$sel:retryOptions:HttpEndpointDestinationUpdate' :: HttpEndpointDestinationUpdate -> Maybe HttpEndpointRetryOptions
$sel:requestConfiguration:HttpEndpointDestinationUpdate' :: HttpEndpointDestinationUpdate
-> Maybe HttpEndpointRequestConfiguration
$sel:processingConfiguration:HttpEndpointDestinationUpdate' :: HttpEndpointDestinationUpdate -> Maybe ProcessingConfiguration
$sel:endpointConfiguration:HttpEndpointDestinationUpdate' :: HttpEndpointDestinationUpdate -> Maybe HttpEndpointConfiguration
$sel:cloudWatchLoggingOptions:HttpEndpointDestinationUpdate' :: HttpEndpointDestinationUpdate -> Maybe CloudWatchLoggingOptions
$sel:bufferingHints:HttpEndpointDestinationUpdate' :: HttpEndpointDestinationUpdate -> Maybe HttpEndpointBufferingHints
..} =
    [Pair] -> Value
Data.object
      ( forall a. [Maybe a] -> [a]
Prelude.catMaybes
          [ (Key
"BufferingHints" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe HttpEndpointBufferingHints
bufferingHints,
            (Key
"CloudWatchLoggingOptions" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe CloudWatchLoggingOptions
cloudWatchLoggingOptions,
            (Key
"EndpointConfiguration" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe HttpEndpointConfiguration
endpointConfiguration,
            (Key
"ProcessingConfiguration" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ProcessingConfiguration
processingConfiguration,
            (Key
"RequestConfiguration" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe HttpEndpointRequestConfiguration
requestConfiguration,
            (Key
"RetryOptions" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe HttpEndpointRetryOptions
retryOptions,
            (Key
"RoleARN" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Text
roleARN,
            (Key
"S3BackupMode" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe HttpEndpointS3BackupMode
s3BackupMode,
            (Key
"S3Update" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe S3DestinationUpdate
s3Update
          ]
      )