{-# 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.NetworkFirewall.UpdateLoggingConfiguration
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
--
-- Sets the logging configuration for the specified firewall.
--
-- To change the logging configuration, retrieve the LoggingConfiguration
-- by calling DescribeLoggingConfiguration, then change it and provide the
-- modified object to this update call. You must change the logging
-- configuration one LogDestinationConfig at a time inside the retrieved
-- LoggingConfiguration object.
--
-- You can perform only one of the following actions in any call to
-- @UpdateLoggingConfiguration@:
--
-- -   Create a new log destination object by adding a single
--     @LogDestinationConfig@ array element to @LogDestinationConfigs@.
--
-- -   Delete a log destination object by removing a single
--     @LogDestinationConfig@ array element from @LogDestinationConfigs@.
--
-- -   Change the @LogDestination@ setting in a single
--     @LogDestinationConfig@ array element.
--
-- You can\'t change the @LogDestinationType@ or @LogType@ in a
-- @LogDestinationConfig@. To change these settings, delete the existing
-- @LogDestinationConfig@ object and create a new one, using two separate
-- calls to this update operation.
module Amazonka.NetworkFirewall.UpdateLoggingConfiguration
  ( -- * Creating a Request
    UpdateLoggingConfiguration (..),
    newUpdateLoggingConfiguration,

    -- * Request Lenses
    updateLoggingConfiguration_firewallArn,
    updateLoggingConfiguration_firewallName,
    updateLoggingConfiguration_loggingConfiguration,

    -- * Destructuring the Response
    UpdateLoggingConfigurationResponse (..),
    newUpdateLoggingConfigurationResponse,

    -- * Response Lenses
    updateLoggingConfigurationResponse_firewallArn,
    updateLoggingConfigurationResponse_firewallName,
    updateLoggingConfigurationResponse_loggingConfiguration,
    updateLoggingConfigurationResponse_httpStatus,
  )
where

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

-- | /See:/ 'newUpdateLoggingConfiguration' smart constructor.
data UpdateLoggingConfiguration = UpdateLoggingConfiguration'
  { -- | The Amazon Resource Name (ARN) of the firewall.
    --
    -- You must specify the ARN or the name, and you can specify both.
    UpdateLoggingConfiguration -> Maybe Text
firewallArn :: Prelude.Maybe Prelude.Text,
    -- | The descriptive name of the firewall. You can\'t change the name of a
    -- firewall after you create it.
    --
    -- You must specify the ARN or the name, and you can specify both.
    UpdateLoggingConfiguration -> Maybe Text
firewallName :: Prelude.Maybe Prelude.Text,
    -- | Defines how Network Firewall performs logging for a firewall. If you
    -- omit this setting, Network Firewall disables logging for the firewall.
    UpdateLoggingConfiguration -> Maybe LoggingConfiguration
loggingConfiguration :: Prelude.Maybe LoggingConfiguration
  }
  deriving (UpdateLoggingConfiguration -> UpdateLoggingConfiguration -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: UpdateLoggingConfiguration -> UpdateLoggingConfiguration -> Bool
$c/= :: UpdateLoggingConfiguration -> UpdateLoggingConfiguration -> Bool
== :: UpdateLoggingConfiguration -> UpdateLoggingConfiguration -> Bool
$c== :: UpdateLoggingConfiguration -> UpdateLoggingConfiguration -> Bool
Prelude.Eq, ReadPrec [UpdateLoggingConfiguration]
ReadPrec UpdateLoggingConfiguration
Int -> ReadS UpdateLoggingConfiguration
ReadS [UpdateLoggingConfiguration]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [UpdateLoggingConfiguration]
$creadListPrec :: ReadPrec [UpdateLoggingConfiguration]
readPrec :: ReadPrec UpdateLoggingConfiguration
$creadPrec :: ReadPrec UpdateLoggingConfiguration
readList :: ReadS [UpdateLoggingConfiguration]
$creadList :: ReadS [UpdateLoggingConfiguration]
readsPrec :: Int -> ReadS UpdateLoggingConfiguration
$creadsPrec :: Int -> ReadS UpdateLoggingConfiguration
Prelude.Read, Int -> UpdateLoggingConfiguration -> ShowS
[UpdateLoggingConfiguration] -> ShowS
UpdateLoggingConfiguration -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [UpdateLoggingConfiguration] -> ShowS
$cshowList :: [UpdateLoggingConfiguration] -> ShowS
show :: UpdateLoggingConfiguration -> String
$cshow :: UpdateLoggingConfiguration -> String
showsPrec :: Int -> UpdateLoggingConfiguration -> ShowS
$cshowsPrec :: Int -> UpdateLoggingConfiguration -> ShowS
Prelude.Show, forall x.
Rep UpdateLoggingConfiguration x -> UpdateLoggingConfiguration
forall x.
UpdateLoggingConfiguration -> Rep UpdateLoggingConfiguration x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep UpdateLoggingConfiguration x -> UpdateLoggingConfiguration
$cfrom :: forall x.
UpdateLoggingConfiguration -> Rep UpdateLoggingConfiguration x
Prelude.Generic)

-- |
-- Create a value of 'UpdateLoggingConfiguration' 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:
--
-- 'firewallArn', 'updateLoggingConfiguration_firewallArn' - The Amazon Resource Name (ARN) of the firewall.
--
-- You must specify the ARN or the name, and you can specify both.
--
-- 'firewallName', 'updateLoggingConfiguration_firewallName' - The descriptive name of the firewall. You can\'t change the name of a
-- firewall after you create it.
--
-- You must specify the ARN or the name, and you can specify both.
--
-- 'loggingConfiguration', 'updateLoggingConfiguration_loggingConfiguration' - Defines how Network Firewall performs logging for a firewall. If you
-- omit this setting, Network Firewall disables logging for the firewall.
newUpdateLoggingConfiguration ::
  UpdateLoggingConfiguration
newUpdateLoggingConfiguration :: UpdateLoggingConfiguration
newUpdateLoggingConfiguration =
  UpdateLoggingConfiguration'
    { $sel:firewallArn:UpdateLoggingConfiguration' :: Maybe Text
firewallArn =
        forall a. Maybe a
Prelude.Nothing,
      $sel:firewallName:UpdateLoggingConfiguration' :: Maybe Text
firewallName = forall a. Maybe a
Prelude.Nothing,
      $sel:loggingConfiguration:UpdateLoggingConfiguration' :: Maybe LoggingConfiguration
loggingConfiguration = forall a. Maybe a
Prelude.Nothing
    }

-- | The Amazon Resource Name (ARN) of the firewall.
--
-- You must specify the ARN or the name, and you can specify both.
updateLoggingConfiguration_firewallArn :: Lens.Lens' UpdateLoggingConfiguration (Prelude.Maybe Prelude.Text)
updateLoggingConfiguration_firewallArn :: Lens' UpdateLoggingConfiguration (Maybe Text)
updateLoggingConfiguration_firewallArn = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateLoggingConfiguration' {Maybe Text
firewallArn :: Maybe Text
$sel:firewallArn:UpdateLoggingConfiguration' :: UpdateLoggingConfiguration -> Maybe Text
firewallArn} -> Maybe Text
firewallArn) (\s :: UpdateLoggingConfiguration
s@UpdateLoggingConfiguration' {} Maybe Text
a -> UpdateLoggingConfiguration
s {$sel:firewallArn:UpdateLoggingConfiguration' :: Maybe Text
firewallArn = Maybe Text
a} :: UpdateLoggingConfiguration)

-- | The descriptive name of the firewall. You can\'t change the name of a
-- firewall after you create it.
--
-- You must specify the ARN or the name, and you can specify both.
updateLoggingConfiguration_firewallName :: Lens.Lens' UpdateLoggingConfiguration (Prelude.Maybe Prelude.Text)
updateLoggingConfiguration_firewallName :: Lens' UpdateLoggingConfiguration (Maybe Text)
updateLoggingConfiguration_firewallName = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateLoggingConfiguration' {Maybe Text
firewallName :: Maybe Text
$sel:firewallName:UpdateLoggingConfiguration' :: UpdateLoggingConfiguration -> Maybe Text
firewallName} -> Maybe Text
firewallName) (\s :: UpdateLoggingConfiguration
s@UpdateLoggingConfiguration' {} Maybe Text
a -> UpdateLoggingConfiguration
s {$sel:firewallName:UpdateLoggingConfiguration' :: Maybe Text
firewallName = Maybe Text
a} :: UpdateLoggingConfiguration)

-- | Defines how Network Firewall performs logging for a firewall. If you
-- omit this setting, Network Firewall disables logging for the firewall.
updateLoggingConfiguration_loggingConfiguration :: Lens.Lens' UpdateLoggingConfiguration (Prelude.Maybe LoggingConfiguration)
updateLoggingConfiguration_loggingConfiguration :: Lens' UpdateLoggingConfiguration (Maybe LoggingConfiguration)
updateLoggingConfiguration_loggingConfiguration = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateLoggingConfiguration' {Maybe LoggingConfiguration
loggingConfiguration :: Maybe LoggingConfiguration
$sel:loggingConfiguration:UpdateLoggingConfiguration' :: UpdateLoggingConfiguration -> Maybe LoggingConfiguration
loggingConfiguration} -> Maybe LoggingConfiguration
loggingConfiguration) (\s :: UpdateLoggingConfiguration
s@UpdateLoggingConfiguration' {} Maybe LoggingConfiguration
a -> UpdateLoggingConfiguration
s {$sel:loggingConfiguration:UpdateLoggingConfiguration' :: Maybe LoggingConfiguration
loggingConfiguration = Maybe LoggingConfiguration
a} :: UpdateLoggingConfiguration)

instance Core.AWSRequest UpdateLoggingConfiguration where
  type
    AWSResponse UpdateLoggingConfiguration =
      UpdateLoggingConfigurationResponse
  request :: (Service -> Service)
-> UpdateLoggingConfiguration -> Request UpdateLoggingConfiguration
request Service -> Service
overrides =
    forall a. (ToRequest a, ToJSON a) => Service -> a -> Request a
Request.postJSON (Service -> Service
overrides Service
defaultService)
  response :: forall (m :: * -> *).
MonadResource m =>
(ByteStringLazy -> IO ByteStringLazy)
-> Service
-> Proxy UpdateLoggingConfiguration
-> ClientResponse ClientBody
-> m (Either
        Error (ClientResponse (AWSResponse UpdateLoggingConfiguration)))
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 Text
-> Maybe Text
-> Maybe LoggingConfiguration
-> Int
-> UpdateLoggingConfigurationResponse
UpdateLoggingConfigurationResponse'
            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
"FirewallArn")
            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
"FirewallName")
            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
"LoggingConfiguration")
            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))
      )

instance Prelude.Hashable UpdateLoggingConfiguration where
  hashWithSalt :: Int -> UpdateLoggingConfiguration -> Int
hashWithSalt Int
_salt UpdateLoggingConfiguration' {Maybe Text
Maybe LoggingConfiguration
loggingConfiguration :: Maybe LoggingConfiguration
firewallName :: Maybe Text
firewallArn :: Maybe Text
$sel:loggingConfiguration:UpdateLoggingConfiguration' :: UpdateLoggingConfiguration -> Maybe LoggingConfiguration
$sel:firewallName:UpdateLoggingConfiguration' :: UpdateLoggingConfiguration -> Maybe Text
$sel:firewallArn:UpdateLoggingConfiguration' :: UpdateLoggingConfiguration -> Maybe Text
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
firewallArn
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
firewallName
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe LoggingConfiguration
loggingConfiguration

instance Prelude.NFData UpdateLoggingConfiguration where
  rnf :: UpdateLoggingConfiguration -> ()
rnf UpdateLoggingConfiguration' {Maybe Text
Maybe LoggingConfiguration
loggingConfiguration :: Maybe LoggingConfiguration
firewallName :: Maybe Text
firewallArn :: Maybe Text
$sel:loggingConfiguration:UpdateLoggingConfiguration' :: UpdateLoggingConfiguration -> Maybe LoggingConfiguration
$sel:firewallName:UpdateLoggingConfiguration' :: UpdateLoggingConfiguration -> Maybe Text
$sel:firewallArn:UpdateLoggingConfiguration' :: UpdateLoggingConfiguration -> Maybe Text
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
firewallArn
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
firewallName
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe LoggingConfiguration
loggingConfiguration

instance Data.ToHeaders UpdateLoggingConfiguration where
  toHeaders :: UpdateLoggingConfiguration -> ResponseHeaders
toHeaders =
    forall a b. a -> b -> a
Prelude.const
      ( forall a. Monoid a => [a] -> a
Prelude.mconcat
          [ HeaderName
"X-Amz-Target"
              forall a. ToHeader a => HeaderName -> a -> ResponseHeaders
Data.=# ( ByteString
"NetworkFirewall_20201112.UpdateLoggingConfiguration" ::
                          Prelude.ByteString
                      ),
            HeaderName
"Content-Type"
              forall a. ToHeader a => HeaderName -> a -> ResponseHeaders
Data.=# ( ByteString
"application/x-amz-json-1.0" ::
                          Prelude.ByteString
                      )
          ]
      )

instance Data.ToJSON UpdateLoggingConfiguration where
  toJSON :: UpdateLoggingConfiguration -> Value
toJSON UpdateLoggingConfiguration' {Maybe Text
Maybe LoggingConfiguration
loggingConfiguration :: Maybe LoggingConfiguration
firewallName :: Maybe Text
firewallArn :: Maybe Text
$sel:loggingConfiguration:UpdateLoggingConfiguration' :: UpdateLoggingConfiguration -> Maybe LoggingConfiguration
$sel:firewallName:UpdateLoggingConfiguration' :: UpdateLoggingConfiguration -> Maybe Text
$sel:firewallArn:UpdateLoggingConfiguration' :: UpdateLoggingConfiguration -> Maybe Text
..} =
    [Pair] -> Value
Data.object
      ( forall a. [Maybe a] -> [a]
Prelude.catMaybes
          [ (Key
"FirewallArn" 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
firewallArn,
            (Key
"FirewallName" 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
firewallName,
            (Key
"LoggingConfiguration" 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 LoggingConfiguration
loggingConfiguration
          ]
      )

instance Data.ToPath UpdateLoggingConfiguration where
  toPath :: UpdateLoggingConfiguration -> ByteString
toPath = forall a b. a -> b -> a
Prelude.const ByteString
"/"

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

-- | /See:/ 'newUpdateLoggingConfigurationResponse' smart constructor.
data UpdateLoggingConfigurationResponse = UpdateLoggingConfigurationResponse'
  { -- | The Amazon Resource Name (ARN) of the firewall.
    UpdateLoggingConfigurationResponse -> Maybe Text
firewallArn :: Prelude.Maybe Prelude.Text,
    -- | The descriptive name of the firewall. You can\'t change the name of a
    -- firewall after you create it.
    UpdateLoggingConfigurationResponse -> Maybe Text
firewallName :: Prelude.Maybe Prelude.Text,
    UpdateLoggingConfigurationResponse -> Maybe LoggingConfiguration
loggingConfiguration :: Prelude.Maybe LoggingConfiguration,
    -- | The response's http status code.
    UpdateLoggingConfigurationResponse -> Int
httpStatus :: Prelude.Int
  }
  deriving (UpdateLoggingConfigurationResponse
-> UpdateLoggingConfigurationResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: UpdateLoggingConfigurationResponse
-> UpdateLoggingConfigurationResponse -> Bool
$c/= :: UpdateLoggingConfigurationResponse
-> UpdateLoggingConfigurationResponse -> Bool
== :: UpdateLoggingConfigurationResponse
-> UpdateLoggingConfigurationResponse -> Bool
$c== :: UpdateLoggingConfigurationResponse
-> UpdateLoggingConfigurationResponse -> Bool
Prelude.Eq, ReadPrec [UpdateLoggingConfigurationResponse]
ReadPrec UpdateLoggingConfigurationResponse
Int -> ReadS UpdateLoggingConfigurationResponse
ReadS [UpdateLoggingConfigurationResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [UpdateLoggingConfigurationResponse]
$creadListPrec :: ReadPrec [UpdateLoggingConfigurationResponse]
readPrec :: ReadPrec UpdateLoggingConfigurationResponse
$creadPrec :: ReadPrec UpdateLoggingConfigurationResponse
readList :: ReadS [UpdateLoggingConfigurationResponse]
$creadList :: ReadS [UpdateLoggingConfigurationResponse]
readsPrec :: Int -> ReadS UpdateLoggingConfigurationResponse
$creadsPrec :: Int -> ReadS UpdateLoggingConfigurationResponse
Prelude.Read, Int -> UpdateLoggingConfigurationResponse -> ShowS
[UpdateLoggingConfigurationResponse] -> ShowS
UpdateLoggingConfigurationResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [UpdateLoggingConfigurationResponse] -> ShowS
$cshowList :: [UpdateLoggingConfigurationResponse] -> ShowS
show :: UpdateLoggingConfigurationResponse -> String
$cshow :: UpdateLoggingConfigurationResponse -> String
showsPrec :: Int -> UpdateLoggingConfigurationResponse -> ShowS
$cshowsPrec :: Int -> UpdateLoggingConfigurationResponse -> ShowS
Prelude.Show, forall x.
Rep UpdateLoggingConfigurationResponse x
-> UpdateLoggingConfigurationResponse
forall x.
UpdateLoggingConfigurationResponse
-> Rep UpdateLoggingConfigurationResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep UpdateLoggingConfigurationResponse x
-> UpdateLoggingConfigurationResponse
$cfrom :: forall x.
UpdateLoggingConfigurationResponse
-> Rep UpdateLoggingConfigurationResponse x
Prelude.Generic)

-- |
-- Create a value of 'UpdateLoggingConfigurationResponse' 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:
--
-- 'firewallArn', 'updateLoggingConfigurationResponse_firewallArn' - The Amazon Resource Name (ARN) of the firewall.
--
-- 'firewallName', 'updateLoggingConfigurationResponse_firewallName' - The descriptive name of the firewall. You can\'t change the name of a
-- firewall after you create it.
--
-- 'loggingConfiguration', 'updateLoggingConfigurationResponse_loggingConfiguration' - Undocumented member.
--
-- 'httpStatus', 'updateLoggingConfigurationResponse_httpStatus' - The response's http status code.
newUpdateLoggingConfigurationResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  UpdateLoggingConfigurationResponse
newUpdateLoggingConfigurationResponse :: Int -> UpdateLoggingConfigurationResponse
newUpdateLoggingConfigurationResponse Int
pHttpStatus_ =
  UpdateLoggingConfigurationResponse'
    { $sel:firewallArn:UpdateLoggingConfigurationResponse' :: Maybe Text
firewallArn =
        forall a. Maybe a
Prelude.Nothing,
      $sel:firewallName:UpdateLoggingConfigurationResponse' :: Maybe Text
firewallName = forall a. Maybe a
Prelude.Nothing,
      $sel:loggingConfiguration:UpdateLoggingConfigurationResponse' :: Maybe LoggingConfiguration
loggingConfiguration = forall a. Maybe a
Prelude.Nothing,
      $sel:httpStatus:UpdateLoggingConfigurationResponse' :: Int
httpStatus = Int
pHttpStatus_
    }

-- | The Amazon Resource Name (ARN) of the firewall.
updateLoggingConfigurationResponse_firewallArn :: Lens.Lens' UpdateLoggingConfigurationResponse (Prelude.Maybe Prelude.Text)
updateLoggingConfigurationResponse_firewallArn :: Lens' UpdateLoggingConfigurationResponse (Maybe Text)
updateLoggingConfigurationResponse_firewallArn = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateLoggingConfigurationResponse' {Maybe Text
firewallArn :: Maybe Text
$sel:firewallArn:UpdateLoggingConfigurationResponse' :: UpdateLoggingConfigurationResponse -> Maybe Text
firewallArn} -> Maybe Text
firewallArn) (\s :: UpdateLoggingConfigurationResponse
s@UpdateLoggingConfigurationResponse' {} Maybe Text
a -> UpdateLoggingConfigurationResponse
s {$sel:firewallArn:UpdateLoggingConfigurationResponse' :: Maybe Text
firewallArn = Maybe Text
a} :: UpdateLoggingConfigurationResponse)

-- | The descriptive name of the firewall. You can\'t change the name of a
-- firewall after you create it.
updateLoggingConfigurationResponse_firewallName :: Lens.Lens' UpdateLoggingConfigurationResponse (Prelude.Maybe Prelude.Text)
updateLoggingConfigurationResponse_firewallName :: Lens' UpdateLoggingConfigurationResponse (Maybe Text)
updateLoggingConfigurationResponse_firewallName = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateLoggingConfigurationResponse' {Maybe Text
firewallName :: Maybe Text
$sel:firewallName:UpdateLoggingConfigurationResponse' :: UpdateLoggingConfigurationResponse -> Maybe Text
firewallName} -> Maybe Text
firewallName) (\s :: UpdateLoggingConfigurationResponse
s@UpdateLoggingConfigurationResponse' {} Maybe Text
a -> UpdateLoggingConfigurationResponse
s {$sel:firewallName:UpdateLoggingConfigurationResponse' :: Maybe Text
firewallName = Maybe Text
a} :: UpdateLoggingConfigurationResponse)

-- | Undocumented member.
updateLoggingConfigurationResponse_loggingConfiguration :: Lens.Lens' UpdateLoggingConfigurationResponse (Prelude.Maybe LoggingConfiguration)
updateLoggingConfigurationResponse_loggingConfiguration :: Lens'
  UpdateLoggingConfigurationResponse (Maybe LoggingConfiguration)
updateLoggingConfigurationResponse_loggingConfiguration = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateLoggingConfigurationResponse' {Maybe LoggingConfiguration
loggingConfiguration :: Maybe LoggingConfiguration
$sel:loggingConfiguration:UpdateLoggingConfigurationResponse' :: UpdateLoggingConfigurationResponse -> Maybe LoggingConfiguration
loggingConfiguration} -> Maybe LoggingConfiguration
loggingConfiguration) (\s :: UpdateLoggingConfigurationResponse
s@UpdateLoggingConfigurationResponse' {} Maybe LoggingConfiguration
a -> UpdateLoggingConfigurationResponse
s {$sel:loggingConfiguration:UpdateLoggingConfigurationResponse' :: Maybe LoggingConfiguration
loggingConfiguration = Maybe LoggingConfiguration
a} :: UpdateLoggingConfigurationResponse)

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

instance
  Prelude.NFData
    UpdateLoggingConfigurationResponse
  where
  rnf :: UpdateLoggingConfigurationResponse -> ()
rnf UpdateLoggingConfigurationResponse' {Int
Maybe Text
Maybe LoggingConfiguration
httpStatus :: Int
loggingConfiguration :: Maybe LoggingConfiguration
firewallName :: Maybe Text
firewallArn :: Maybe Text
$sel:httpStatus:UpdateLoggingConfigurationResponse' :: UpdateLoggingConfigurationResponse -> Int
$sel:loggingConfiguration:UpdateLoggingConfigurationResponse' :: UpdateLoggingConfigurationResponse -> Maybe LoggingConfiguration
$sel:firewallName:UpdateLoggingConfigurationResponse' :: UpdateLoggingConfigurationResponse -> Maybe Text
$sel:firewallArn:UpdateLoggingConfigurationResponse' :: UpdateLoggingConfigurationResponse -> Maybe Text
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
firewallArn
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
firewallName
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe LoggingConfiguration
loggingConfiguration
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Int
httpStatus