{-# 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.LakeFormation.UpdateTableStorageOptimizer
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
--
-- Updates the configuration of the storage optimizers for a table.
module Amazonka.LakeFormation.UpdateTableStorageOptimizer
  ( -- * Creating a Request
    UpdateTableStorageOptimizer (..),
    newUpdateTableStorageOptimizer,

    -- * Request Lenses
    updateTableStorageOptimizer_catalogId,
    updateTableStorageOptimizer_databaseName,
    updateTableStorageOptimizer_tableName,
    updateTableStorageOptimizer_storageOptimizerConfig,

    -- * Destructuring the Response
    UpdateTableStorageOptimizerResponse (..),
    newUpdateTableStorageOptimizerResponse,

    -- * Response Lenses
    updateTableStorageOptimizerResponse_result,
    updateTableStorageOptimizerResponse_httpStatus,
  )
where

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

-- | /See:/ 'newUpdateTableStorageOptimizer' smart constructor.
data UpdateTableStorageOptimizer = UpdateTableStorageOptimizer'
  { -- | The Catalog ID of the table.
    UpdateTableStorageOptimizer -> Maybe Text
catalogId :: Prelude.Maybe Prelude.Text,
    -- | Name of the database where the table is present.
    UpdateTableStorageOptimizer -> Text
databaseName :: Prelude.Text,
    -- | Name of the table for which to enable the storage optimizer.
    UpdateTableStorageOptimizer -> Text
tableName :: Prelude.Text,
    -- | Name of the table for which to enable the storage optimizer.
    UpdateTableStorageOptimizer
-> HashMap OptimizerType (HashMap Text Text)
storageOptimizerConfig :: Prelude.HashMap OptimizerType (Prelude.HashMap Prelude.Text Prelude.Text)
  }
  deriving (UpdateTableStorageOptimizer -> UpdateTableStorageOptimizer -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: UpdateTableStorageOptimizer -> UpdateTableStorageOptimizer -> Bool
$c/= :: UpdateTableStorageOptimizer -> UpdateTableStorageOptimizer -> Bool
== :: UpdateTableStorageOptimizer -> UpdateTableStorageOptimizer -> Bool
$c== :: UpdateTableStorageOptimizer -> UpdateTableStorageOptimizer -> Bool
Prelude.Eq, ReadPrec [UpdateTableStorageOptimizer]
ReadPrec UpdateTableStorageOptimizer
Int -> ReadS UpdateTableStorageOptimizer
ReadS [UpdateTableStorageOptimizer]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [UpdateTableStorageOptimizer]
$creadListPrec :: ReadPrec [UpdateTableStorageOptimizer]
readPrec :: ReadPrec UpdateTableStorageOptimizer
$creadPrec :: ReadPrec UpdateTableStorageOptimizer
readList :: ReadS [UpdateTableStorageOptimizer]
$creadList :: ReadS [UpdateTableStorageOptimizer]
readsPrec :: Int -> ReadS UpdateTableStorageOptimizer
$creadsPrec :: Int -> ReadS UpdateTableStorageOptimizer
Prelude.Read, Int -> UpdateTableStorageOptimizer -> ShowS
[UpdateTableStorageOptimizer] -> ShowS
UpdateTableStorageOptimizer -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [UpdateTableStorageOptimizer] -> ShowS
$cshowList :: [UpdateTableStorageOptimizer] -> ShowS
show :: UpdateTableStorageOptimizer -> String
$cshow :: UpdateTableStorageOptimizer -> String
showsPrec :: Int -> UpdateTableStorageOptimizer -> ShowS
$cshowsPrec :: Int -> UpdateTableStorageOptimizer -> ShowS
Prelude.Show, forall x.
Rep UpdateTableStorageOptimizer x -> UpdateTableStorageOptimizer
forall x.
UpdateTableStorageOptimizer -> Rep UpdateTableStorageOptimizer x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep UpdateTableStorageOptimizer x -> UpdateTableStorageOptimizer
$cfrom :: forall x.
UpdateTableStorageOptimizer -> Rep UpdateTableStorageOptimizer x
Prelude.Generic)

-- |
-- Create a value of 'UpdateTableStorageOptimizer' 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:
--
-- 'catalogId', 'updateTableStorageOptimizer_catalogId' - The Catalog ID of the table.
--
-- 'databaseName', 'updateTableStorageOptimizer_databaseName' - Name of the database where the table is present.
--
-- 'tableName', 'updateTableStorageOptimizer_tableName' - Name of the table for which to enable the storage optimizer.
--
-- 'storageOptimizerConfig', 'updateTableStorageOptimizer_storageOptimizerConfig' - Name of the table for which to enable the storage optimizer.
newUpdateTableStorageOptimizer ::
  -- | 'databaseName'
  Prelude.Text ->
  -- | 'tableName'
  Prelude.Text ->
  UpdateTableStorageOptimizer
newUpdateTableStorageOptimizer :: Text -> Text -> UpdateTableStorageOptimizer
newUpdateTableStorageOptimizer
  Text
pDatabaseName_
  Text
pTableName_ =
    UpdateTableStorageOptimizer'
      { $sel:catalogId:UpdateTableStorageOptimizer' :: Maybe Text
catalogId =
          forall a. Maybe a
Prelude.Nothing,
        $sel:databaseName:UpdateTableStorageOptimizer' :: Text
databaseName = Text
pDatabaseName_,
        $sel:tableName:UpdateTableStorageOptimizer' :: Text
tableName = Text
pTableName_,
        $sel:storageOptimizerConfig:UpdateTableStorageOptimizer' :: HashMap OptimizerType (HashMap Text Text)
storageOptimizerConfig = forall a. Monoid a => a
Prelude.mempty
      }

-- | The Catalog ID of the table.
updateTableStorageOptimizer_catalogId :: Lens.Lens' UpdateTableStorageOptimizer (Prelude.Maybe Prelude.Text)
updateTableStorageOptimizer_catalogId :: Lens' UpdateTableStorageOptimizer (Maybe Text)
updateTableStorageOptimizer_catalogId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateTableStorageOptimizer' {Maybe Text
catalogId :: Maybe Text
$sel:catalogId:UpdateTableStorageOptimizer' :: UpdateTableStorageOptimizer -> Maybe Text
catalogId} -> Maybe Text
catalogId) (\s :: UpdateTableStorageOptimizer
s@UpdateTableStorageOptimizer' {} Maybe Text
a -> UpdateTableStorageOptimizer
s {$sel:catalogId:UpdateTableStorageOptimizer' :: Maybe Text
catalogId = Maybe Text
a} :: UpdateTableStorageOptimizer)

-- | Name of the database where the table is present.
updateTableStorageOptimizer_databaseName :: Lens.Lens' UpdateTableStorageOptimizer Prelude.Text
updateTableStorageOptimizer_databaseName :: Lens' UpdateTableStorageOptimizer Text
updateTableStorageOptimizer_databaseName = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateTableStorageOptimizer' {Text
databaseName :: Text
$sel:databaseName:UpdateTableStorageOptimizer' :: UpdateTableStorageOptimizer -> Text
databaseName} -> Text
databaseName) (\s :: UpdateTableStorageOptimizer
s@UpdateTableStorageOptimizer' {} Text
a -> UpdateTableStorageOptimizer
s {$sel:databaseName:UpdateTableStorageOptimizer' :: Text
databaseName = Text
a} :: UpdateTableStorageOptimizer)

-- | Name of the table for which to enable the storage optimizer.
updateTableStorageOptimizer_tableName :: Lens.Lens' UpdateTableStorageOptimizer Prelude.Text
updateTableStorageOptimizer_tableName :: Lens' UpdateTableStorageOptimizer Text
updateTableStorageOptimizer_tableName = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateTableStorageOptimizer' {Text
tableName :: Text
$sel:tableName:UpdateTableStorageOptimizer' :: UpdateTableStorageOptimizer -> Text
tableName} -> Text
tableName) (\s :: UpdateTableStorageOptimizer
s@UpdateTableStorageOptimizer' {} Text
a -> UpdateTableStorageOptimizer
s {$sel:tableName:UpdateTableStorageOptimizer' :: Text
tableName = Text
a} :: UpdateTableStorageOptimizer)

-- | Name of the table for which to enable the storage optimizer.
updateTableStorageOptimizer_storageOptimizerConfig :: Lens.Lens' UpdateTableStorageOptimizer (Prelude.HashMap OptimizerType (Prelude.HashMap Prelude.Text Prelude.Text))
updateTableStorageOptimizer_storageOptimizerConfig :: Lens'
  UpdateTableStorageOptimizer
  (HashMap OptimizerType (HashMap Text Text))
updateTableStorageOptimizer_storageOptimizerConfig = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateTableStorageOptimizer' {HashMap OptimizerType (HashMap Text Text)
storageOptimizerConfig :: HashMap OptimizerType (HashMap Text Text)
$sel:storageOptimizerConfig:UpdateTableStorageOptimizer' :: UpdateTableStorageOptimizer
-> HashMap OptimizerType (HashMap Text Text)
storageOptimizerConfig} -> HashMap OptimizerType (HashMap Text Text)
storageOptimizerConfig) (\s :: UpdateTableStorageOptimizer
s@UpdateTableStorageOptimizer' {} HashMap OptimizerType (HashMap Text Text)
a -> UpdateTableStorageOptimizer
s {$sel:storageOptimizerConfig:UpdateTableStorageOptimizer' :: HashMap OptimizerType (HashMap Text Text)
storageOptimizerConfig = HashMap OptimizerType (HashMap Text Text)
a} :: UpdateTableStorageOptimizer) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced

instance Core.AWSRequest UpdateTableStorageOptimizer where
  type
    AWSResponse UpdateTableStorageOptimizer =
      UpdateTableStorageOptimizerResponse
  request :: (Service -> Service)
-> UpdateTableStorageOptimizer
-> Request UpdateTableStorageOptimizer
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 UpdateTableStorageOptimizer
-> ClientResponse ClientBody
-> m (Either
        Error (ClientResponse (AWSResponse UpdateTableStorageOptimizer)))
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 -> Int -> UpdateTableStorageOptimizerResponse
UpdateTableStorageOptimizerResponse'
            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
"Result")
            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 UpdateTableStorageOptimizer where
  hashWithSalt :: Int -> UpdateTableStorageOptimizer -> Int
hashWithSalt Int
_salt UpdateTableStorageOptimizer' {Maybe Text
Text
HashMap OptimizerType (HashMap Text Text)
storageOptimizerConfig :: HashMap OptimizerType (HashMap Text Text)
tableName :: Text
databaseName :: Text
catalogId :: Maybe Text
$sel:storageOptimizerConfig:UpdateTableStorageOptimizer' :: UpdateTableStorageOptimizer
-> HashMap OptimizerType (HashMap Text Text)
$sel:tableName:UpdateTableStorageOptimizer' :: UpdateTableStorageOptimizer -> Text
$sel:databaseName:UpdateTableStorageOptimizer' :: UpdateTableStorageOptimizer -> Text
$sel:catalogId:UpdateTableStorageOptimizer' :: UpdateTableStorageOptimizer -> Maybe Text
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
catalogId
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
databaseName
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
tableName
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` HashMap OptimizerType (HashMap Text Text)
storageOptimizerConfig

instance Prelude.NFData UpdateTableStorageOptimizer where
  rnf :: UpdateTableStorageOptimizer -> ()
rnf UpdateTableStorageOptimizer' {Maybe Text
Text
HashMap OptimizerType (HashMap Text Text)
storageOptimizerConfig :: HashMap OptimizerType (HashMap Text Text)
tableName :: Text
databaseName :: Text
catalogId :: Maybe Text
$sel:storageOptimizerConfig:UpdateTableStorageOptimizer' :: UpdateTableStorageOptimizer
-> HashMap OptimizerType (HashMap Text Text)
$sel:tableName:UpdateTableStorageOptimizer' :: UpdateTableStorageOptimizer -> Text
$sel:databaseName:UpdateTableStorageOptimizer' :: UpdateTableStorageOptimizer -> Text
$sel:catalogId:UpdateTableStorageOptimizer' :: UpdateTableStorageOptimizer -> Maybe Text
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
catalogId
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Text
databaseName
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Text
tableName
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf HashMap OptimizerType (HashMap Text Text)
storageOptimizerConfig

instance Data.ToHeaders UpdateTableStorageOptimizer where
  toHeaders :: UpdateTableStorageOptimizer -> 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.ToJSON UpdateTableStorageOptimizer where
  toJSON :: UpdateTableStorageOptimizer -> Value
toJSON UpdateTableStorageOptimizer' {Maybe Text
Text
HashMap OptimizerType (HashMap Text Text)
storageOptimizerConfig :: HashMap OptimizerType (HashMap Text Text)
tableName :: Text
databaseName :: Text
catalogId :: Maybe Text
$sel:storageOptimizerConfig:UpdateTableStorageOptimizer' :: UpdateTableStorageOptimizer
-> HashMap OptimizerType (HashMap Text Text)
$sel:tableName:UpdateTableStorageOptimizer' :: UpdateTableStorageOptimizer -> Text
$sel:databaseName:UpdateTableStorageOptimizer' :: UpdateTableStorageOptimizer -> Text
$sel:catalogId:UpdateTableStorageOptimizer' :: UpdateTableStorageOptimizer -> Maybe Text
..} =
    [Pair] -> Value
Data.object
      ( forall a. [Maybe a] -> [a]
Prelude.catMaybes
          [ (Key
"CatalogId" 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
catalogId,
            forall a. a -> Maybe a
Prelude.Just (Key
"DatabaseName" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..= Text
databaseName),
            forall a. a -> Maybe a
Prelude.Just (Key
"TableName" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..= Text
tableName),
            forall a. a -> Maybe a
Prelude.Just
              ( Key
"StorageOptimizerConfig"
                  forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..= HashMap OptimizerType (HashMap Text Text)
storageOptimizerConfig
              )
          ]
      )

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

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

-- | /See:/ 'newUpdateTableStorageOptimizerResponse' smart constructor.
data UpdateTableStorageOptimizerResponse = UpdateTableStorageOptimizerResponse'
  { -- | A response indicating the success of failure of the operation.
    UpdateTableStorageOptimizerResponse -> Maybe Text
result :: Prelude.Maybe Prelude.Text,
    -- | The response's http status code.
    UpdateTableStorageOptimizerResponse -> Int
httpStatus :: Prelude.Int
  }
  deriving (UpdateTableStorageOptimizerResponse
-> UpdateTableStorageOptimizerResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: UpdateTableStorageOptimizerResponse
-> UpdateTableStorageOptimizerResponse -> Bool
$c/= :: UpdateTableStorageOptimizerResponse
-> UpdateTableStorageOptimizerResponse -> Bool
== :: UpdateTableStorageOptimizerResponse
-> UpdateTableStorageOptimizerResponse -> Bool
$c== :: UpdateTableStorageOptimizerResponse
-> UpdateTableStorageOptimizerResponse -> Bool
Prelude.Eq, ReadPrec [UpdateTableStorageOptimizerResponse]
ReadPrec UpdateTableStorageOptimizerResponse
Int -> ReadS UpdateTableStorageOptimizerResponse
ReadS [UpdateTableStorageOptimizerResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [UpdateTableStorageOptimizerResponse]
$creadListPrec :: ReadPrec [UpdateTableStorageOptimizerResponse]
readPrec :: ReadPrec UpdateTableStorageOptimizerResponse
$creadPrec :: ReadPrec UpdateTableStorageOptimizerResponse
readList :: ReadS [UpdateTableStorageOptimizerResponse]
$creadList :: ReadS [UpdateTableStorageOptimizerResponse]
readsPrec :: Int -> ReadS UpdateTableStorageOptimizerResponse
$creadsPrec :: Int -> ReadS UpdateTableStorageOptimizerResponse
Prelude.Read, Int -> UpdateTableStorageOptimizerResponse -> ShowS
[UpdateTableStorageOptimizerResponse] -> ShowS
UpdateTableStorageOptimizerResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [UpdateTableStorageOptimizerResponse] -> ShowS
$cshowList :: [UpdateTableStorageOptimizerResponse] -> ShowS
show :: UpdateTableStorageOptimizerResponse -> String
$cshow :: UpdateTableStorageOptimizerResponse -> String
showsPrec :: Int -> UpdateTableStorageOptimizerResponse -> ShowS
$cshowsPrec :: Int -> UpdateTableStorageOptimizerResponse -> ShowS
Prelude.Show, forall x.
Rep UpdateTableStorageOptimizerResponse x
-> UpdateTableStorageOptimizerResponse
forall x.
UpdateTableStorageOptimizerResponse
-> Rep UpdateTableStorageOptimizerResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep UpdateTableStorageOptimizerResponse x
-> UpdateTableStorageOptimizerResponse
$cfrom :: forall x.
UpdateTableStorageOptimizerResponse
-> Rep UpdateTableStorageOptimizerResponse x
Prelude.Generic)

-- |
-- Create a value of 'UpdateTableStorageOptimizerResponse' 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:
--
-- 'result', 'updateTableStorageOptimizerResponse_result' - A response indicating the success of failure of the operation.
--
-- 'httpStatus', 'updateTableStorageOptimizerResponse_httpStatus' - The response's http status code.
newUpdateTableStorageOptimizerResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  UpdateTableStorageOptimizerResponse
newUpdateTableStorageOptimizerResponse :: Int -> UpdateTableStorageOptimizerResponse
newUpdateTableStorageOptimizerResponse Int
pHttpStatus_ =
  UpdateTableStorageOptimizerResponse'
    { $sel:result:UpdateTableStorageOptimizerResponse' :: Maybe Text
result =
        forall a. Maybe a
Prelude.Nothing,
      $sel:httpStatus:UpdateTableStorageOptimizerResponse' :: Int
httpStatus = Int
pHttpStatus_
    }

-- | A response indicating the success of failure of the operation.
updateTableStorageOptimizerResponse_result :: Lens.Lens' UpdateTableStorageOptimizerResponse (Prelude.Maybe Prelude.Text)
updateTableStorageOptimizerResponse_result :: Lens' UpdateTableStorageOptimizerResponse (Maybe Text)
updateTableStorageOptimizerResponse_result = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateTableStorageOptimizerResponse' {Maybe Text
result :: Maybe Text
$sel:result:UpdateTableStorageOptimizerResponse' :: UpdateTableStorageOptimizerResponse -> Maybe Text
result} -> Maybe Text
result) (\s :: UpdateTableStorageOptimizerResponse
s@UpdateTableStorageOptimizerResponse' {} Maybe Text
a -> UpdateTableStorageOptimizerResponse
s {$sel:result:UpdateTableStorageOptimizerResponse' :: Maybe Text
result = Maybe Text
a} :: UpdateTableStorageOptimizerResponse)

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

instance
  Prelude.NFData
    UpdateTableStorageOptimizerResponse
  where
  rnf :: UpdateTableStorageOptimizerResponse -> ()
rnf UpdateTableStorageOptimizerResponse' {Int
Maybe Text
httpStatus :: Int
result :: Maybe Text
$sel:httpStatus:UpdateTableStorageOptimizerResponse' :: UpdateTableStorageOptimizerResponse -> Int
$sel:result:UpdateTableStorageOptimizerResponse' :: UpdateTableStorageOptimizerResponse -> Maybe Text
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
result
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Int
httpStatus