{-# 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.BillingConductor.UpdatePricingPlan
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
--
-- This updates an existing pricing plan.
module Amazonka.BillingConductor.UpdatePricingPlan
  ( -- * Creating a Request
    UpdatePricingPlan (..),
    newUpdatePricingPlan,

    -- * Request Lenses
    updatePricingPlan_description,
    updatePricingPlan_name,
    updatePricingPlan_arn,

    -- * Destructuring the Response
    UpdatePricingPlanResponse (..),
    newUpdatePricingPlanResponse,

    -- * Response Lenses
    updatePricingPlanResponse_arn,
    updatePricingPlanResponse_description,
    updatePricingPlanResponse_lastModifiedTime,
    updatePricingPlanResponse_name,
    updatePricingPlanResponse_size,
    updatePricingPlanResponse_httpStatus,
  )
where

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

-- | /See:/ 'newUpdatePricingPlan' smart constructor.
data UpdatePricingPlan = UpdatePricingPlan'
  { -- | The description of the pricing plan.
    UpdatePricingPlan -> Maybe (Sensitive Text)
description :: Prelude.Maybe (Data.Sensitive Prelude.Text),
    -- | The name of the pricing plan. The name must be unique to each pricing
    -- plan.
    UpdatePricingPlan -> Maybe (Sensitive Text)
name :: Prelude.Maybe (Data.Sensitive Prelude.Text),
    -- | The Amazon Resource Name (ARN) of the pricing plan that you\'re
    -- updating.
    UpdatePricingPlan -> Text
arn :: Prelude.Text
  }
  deriving (UpdatePricingPlan -> UpdatePricingPlan -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: UpdatePricingPlan -> UpdatePricingPlan -> Bool
$c/= :: UpdatePricingPlan -> UpdatePricingPlan -> Bool
== :: UpdatePricingPlan -> UpdatePricingPlan -> Bool
$c== :: UpdatePricingPlan -> UpdatePricingPlan -> Bool
Prelude.Eq, Int -> UpdatePricingPlan -> ShowS
[UpdatePricingPlan] -> ShowS
UpdatePricingPlan -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [UpdatePricingPlan] -> ShowS
$cshowList :: [UpdatePricingPlan] -> ShowS
show :: UpdatePricingPlan -> String
$cshow :: UpdatePricingPlan -> String
showsPrec :: Int -> UpdatePricingPlan -> ShowS
$cshowsPrec :: Int -> UpdatePricingPlan -> ShowS
Prelude.Show, forall x. Rep UpdatePricingPlan x -> UpdatePricingPlan
forall x. UpdatePricingPlan -> Rep UpdatePricingPlan x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep UpdatePricingPlan x -> UpdatePricingPlan
$cfrom :: forall x. UpdatePricingPlan -> Rep UpdatePricingPlan x
Prelude.Generic)

-- |
-- Create a value of 'UpdatePricingPlan' 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:
--
-- 'description', 'updatePricingPlan_description' - The description of the pricing plan.
--
-- 'name', 'updatePricingPlan_name' - The name of the pricing plan. The name must be unique to each pricing
-- plan.
--
-- 'arn', 'updatePricingPlan_arn' - The Amazon Resource Name (ARN) of the pricing plan that you\'re
-- updating.
newUpdatePricingPlan ::
  -- | 'arn'
  Prelude.Text ->
  UpdatePricingPlan
newUpdatePricingPlan :: Text -> UpdatePricingPlan
newUpdatePricingPlan Text
pArn_ =
  UpdatePricingPlan'
    { $sel:description:UpdatePricingPlan' :: Maybe (Sensitive Text)
description = forall a. Maybe a
Prelude.Nothing,
      $sel:name:UpdatePricingPlan' :: Maybe (Sensitive Text)
name = forall a. Maybe a
Prelude.Nothing,
      $sel:arn:UpdatePricingPlan' :: Text
arn = Text
pArn_
    }

-- | The description of the pricing plan.
updatePricingPlan_description :: Lens.Lens' UpdatePricingPlan (Prelude.Maybe Prelude.Text)
updatePricingPlan_description :: Lens' UpdatePricingPlan (Maybe Text)
updatePricingPlan_description = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdatePricingPlan' {Maybe (Sensitive Text)
description :: Maybe (Sensitive Text)
$sel:description:UpdatePricingPlan' :: UpdatePricingPlan -> Maybe (Sensitive Text)
description} -> Maybe (Sensitive Text)
description) (\s :: UpdatePricingPlan
s@UpdatePricingPlan' {} Maybe (Sensitive Text)
a -> UpdatePricingPlan
s {$sel:description:UpdatePricingPlan' :: Maybe (Sensitive Text)
description = Maybe (Sensitive Text)
a} :: UpdatePricingPlan) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping forall a. Iso' (Sensitive a) a
Data._Sensitive

-- | The name of the pricing plan. The name must be unique to each pricing
-- plan.
updatePricingPlan_name :: Lens.Lens' UpdatePricingPlan (Prelude.Maybe Prelude.Text)
updatePricingPlan_name :: Lens' UpdatePricingPlan (Maybe Text)
updatePricingPlan_name = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdatePricingPlan' {Maybe (Sensitive Text)
name :: Maybe (Sensitive Text)
$sel:name:UpdatePricingPlan' :: UpdatePricingPlan -> Maybe (Sensitive Text)
name} -> Maybe (Sensitive Text)
name) (\s :: UpdatePricingPlan
s@UpdatePricingPlan' {} Maybe (Sensitive Text)
a -> UpdatePricingPlan
s {$sel:name:UpdatePricingPlan' :: Maybe (Sensitive Text)
name = Maybe (Sensitive Text)
a} :: UpdatePricingPlan) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping forall a. Iso' (Sensitive a) a
Data._Sensitive

-- | The Amazon Resource Name (ARN) of the pricing plan that you\'re
-- updating.
updatePricingPlan_arn :: Lens.Lens' UpdatePricingPlan Prelude.Text
updatePricingPlan_arn :: Lens' UpdatePricingPlan Text
updatePricingPlan_arn = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdatePricingPlan' {Text
arn :: Text
$sel:arn:UpdatePricingPlan' :: UpdatePricingPlan -> Text
arn} -> Text
arn) (\s :: UpdatePricingPlan
s@UpdatePricingPlan' {} Text
a -> UpdatePricingPlan
s {$sel:arn:UpdatePricingPlan' :: Text
arn = Text
a} :: UpdatePricingPlan)

instance Core.AWSRequest UpdatePricingPlan where
  type
    AWSResponse UpdatePricingPlan =
      UpdatePricingPlanResponse
  request :: (Service -> Service)
-> UpdatePricingPlan -> Request UpdatePricingPlan
request Service -> Service
overrides =
    forall a. (ToRequest a, ToJSON a) => Service -> a -> Request a
Request.putJSON (Service -> Service
overrides Service
defaultService)
  response :: forall (m :: * -> *).
MonadResource m =>
(ByteStringLazy -> IO ByteStringLazy)
-> Service
-> Proxy UpdatePricingPlan
-> ClientResponse ClientBody
-> m (Either
        Error (ClientResponse (AWSResponse UpdatePricingPlan)))
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 (Sensitive Text)
-> Maybe Integer
-> Maybe (Sensitive Text)
-> Maybe Natural
-> Int
-> UpdatePricingPlanResponse
UpdatePricingPlanResponse'
            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
"Arn")
            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
"Description")
            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
"LastModifiedTime")
            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
"Name")
            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
"Size")
            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 UpdatePricingPlan where
  hashWithSalt :: Int -> UpdatePricingPlan -> Int
hashWithSalt Int
_salt UpdatePricingPlan' {Maybe (Sensitive Text)
Text
arn :: Text
name :: Maybe (Sensitive Text)
description :: Maybe (Sensitive Text)
$sel:arn:UpdatePricingPlan' :: UpdatePricingPlan -> Text
$sel:name:UpdatePricingPlan' :: UpdatePricingPlan -> Maybe (Sensitive Text)
$sel:description:UpdatePricingPlan' :: UpdatePricingPlan -> Maybe (Sensitive Text)
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe (Sensitive Text)
description
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe (Sensitive Text)
name
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
arn

instance Prelude.NFData UpdatePricingPlan where
  rnf :: UpdatePricingPlan -> ()
rnf UpdatePricingPlan' {Maybe (Sensitive Text)
Text
arn :: Text
name :: Maybe (Sensitive Text)
description :: Maybe (Sensitive Text)
$sel:arn:UpdatePricingPlan' :: UpdatePricingPlan -> Text
$sel:name:UpdatePricingPlan' :: UpdatePricingPlan -> Maybe (Sensitive Text)
$sel:description:UpdatePricingPlan' :: UpdatePricingPlan -> Maybe (Sensitive Text)
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe (Sensitive Text)
description
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe (Sensitive Text)
name
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Text
arn

instance Data.ToHeaders UpdatePricingPlan where
  toHeaders :: UpdatePricingPlan -> 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 UpdatePricingPlan where
  toJSON :: UpdatePricingPlan -> Value
toJSON UpdatePricingPlan' {Maybe (Sensitive Text)
Text
arn :: Text
name :: Maybe (Sensitive Text)
description :: Maybe (Sensitive Text)
$sel:arn:UpdatePricingPlan' :: UpdatePricingPlan -> Text
$sel:name:UpdatePricingPlan' :: UpdatePricingPlan -> Maybe (Sensitive Text)
$sel:description:UpdatePricingPlan' :: UpdatePricingPlan -> Maybe (Sensitive Text)
..} =
    [Pair] -> Value
Data.object
      ( forall a. [Maybe a] -> [a]
Prelude.catMaybes
          [ (Key
"Description" 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 (Sensitive Text)
description,
            (Key
"Name" 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 (Sensitive Text)
name,
            forall a. a -> Maybe a
Prelude.Just (Key
"Arn" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..= Text
arn)
          ]
      )

instance Data.ToPath UpdatePricingPlan where
  toPath :: UpdatePricingPlan -> ByteString
toPath = forall a b. a -> b -> a
Prelude.const ByteString
"/update-pricing-plan"

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

-- | /See:/ 'newUpdatePricingPlanResponse' smart constructor.
data UpdatePricingPlanResponse = UpdatePricingPlanResponse'
  { -- | The Amazon Resource Name (ARN) of the updated pricing plan.
    UpdatePricingPlanResponse -> Maybe Text
arn :: Prelude.Maybe Prelude.Text,
    -- | The new description for the pricing rule.
    UpdatePricingPlanResponse -> Maybe (Sensitive Text)
description :: Prelude.Maybe (Data.Sensitive Prelude.Text),
    -- | The most recent time when the pricing plan was modified.
    UpdatePricingPlanResponse -> Maybe Integer
lastModifiedTime :: Prelude.Maybe Prelude.Integer,
    -- | The name of the pricing plan. The name must be unique to each pricing
    -- plan.
    UpdatePricingPlanResponse -> Maybe (Sensitive Text)
name :: Prelude.Maybe (Data.Sensitive Prelude.Text),
    -- | The pricing rules count that\'s currently associated with this pricing
    -- plan list.
    UpdatePricingPlanResponse -> Maybe Natural
size :: Prelude.Maybe Prelude.Natural,
    -- | The response's http status code.
    UpdatePricingPlanResponse -> Int
httpStatus :: Prelude.Int
  }
  deriving (UpdatePricingPlanResponse -> UpdatePricingPlanResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: UpdatePricingPlanResponse -> UpdatePricingPlanResponse -> Bool
$c/= :: UpdatePricingPlanResponse -> UpdatePricingPlanResponse -> Bool
== :: UpdatePricingPlanResponse -> UpdatePricingPlanResponse -> Bool
$c== :: UpdatePricingPlanResponse -> UpdatePricingPlanResponse -> Bool
Prelude.Eq, Int -> UpdatePricingPlanResponse -> ShowS
[UpdatePricingPlanResponse] -> ShowS
UpdatePricingPlanResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [UpdatePricingPlanResponse] -> ShowS
$cshowList :: [UpdatePricingPlanResponse] -> ShowS
show :: UpdatePricingPlanResponse -> String
$cshow :: UpdatePricingPlanResponse -> String
showsPrec :: Int -> UpdatePricingPlanResponse -> ShowS
$cshowsPrec :: Int -> UpdatePricingPlanResponse -> ShowS
Prelude.Show, forall x.
Rep UpdatePricingPlanResponse x -> UpdatePricingPlanResponse
forall x.
UpdatePricingPlanResponse -> Rep UpdatePricingPlanResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep UpdatePricingPlanResponse x -> UpdatePricingPlanResponse
$cfrom :: forall x.
UpdatePricingPlanResponse -> Rep UpdatePricingPlanResponse x
Prelude.Generic)

-- |
-- Create a value of 'UpdatePricingPlanResponse' 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:
--
-- 'arn', 'updatePricingPlanResponse_arn' - The Amazon Resource Name (ARN) of the updated pricing plan.
--
-- 'description', 'updatePricingPlanResponse_description' - The new description for the pricing rule.
--
-- 'lastModifiedTime', 'updatePricingPlanResponse_lastModifiedTime' - The most recent time when the pricing plan was modified.
--
-- 'name', 'updatePricingPlanResponse_name' - The name of the pricing plan. The name must be unique to each pricing
-- plan.
--
-- 'size', 'updatePricingPlanResponse_size' - The pricing rules count that\'s currently associated with this pricing
-- plan list.
--
-- 'httpStatus', 'updatePricingPlanResponse_httpStatus' - The response's http status code.
newUpdatePricingPlanResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  UpdatePricingPlanResponse
newUpdatePricingPlanResponse :: Int -> UpdatePricingPlanResponse
newUpdatePricingPlanResponse Int
pHttpStatus_ =
  UpdatePricingPlanResponse'
    { $sel:arn:UpdatePricingPlanResponse' :: Maybe Text
arn = forall a. Maybe a
Prelude.Nothing,
      $sel:description:UpdatePricingPlanResponse' :: Maybe (Sensitive Text)
description = forall a. Maybe a
Prelude.Nothing,
      $sel:lastModifiedTime:UpdatePricingPlanResponse' :: Maybe Integer
lastModifiedTime = forall a. Maybe a
Prelude.Nothing,
      $sel:name:UpdatePricingPlanResponse' :: Maybe (Sensitive Text)
name = forall a. Maybe a
Prelude.Nothing,
      $sel:size:UpdatePricingPlanResponse' :: Maybe Natural
size = forall a. Maybe a
Prelude.Nothing,
      $sel:httpStatus:UpdatePricingPlanResponse' :: Int
httpStatus = Int
pHttpStatus_
    }

-- | The Amazon Resource Name (ARN) of the updated pricing plan.
updatePricingPlanResponse_arn :: Lens.Lens' UpdatePricingPlanResponse (Prelude.Maybe Prelude.Text)
updatePricingPlanResponse_arn :: Lens' UpdatePricingPlanResponse (Maybe Text)
updatePricingPlanResponse_arn = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdatePricingPlanResponse' {Maybe Text
arn :: Maybe Text
$sel:arn:UpdatePricingPlanResponse' :: UpdatePricingPlanResponse -> Maybe Text
arn} -> Maybe Text
arn) (\s :: UpdatePricingPlanResponse
s@UpdatePricingPlanResponse' {} Maybe Text
a -> UpdatePricingPlanResponse
s {$sel:arn:UpdatePricingPlanResponse' :: Maybe Text
arn = Maybe Text
a} :: UpdatePricingPlanResponse)

-- | The new description for the pricing rule.
updatePricingPlanResponse_description :: Lens.Lens' UpdatePricingPlanResponse (Prelude.Maybe Prelude.Text)
updatePricingPlanResponse_description :: Lens' UpdatePricingPlanResponse (Maybe Text)
updatePricingPlanResponse_description = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdatePricingPlanResponse' {Maybe (Sensitive Text)
description :: Maybe (Sensitive Text)
$sel:description:UpdatePricingPlanResponse' :: UpdatePricingPlanResponse -> Maybe (Sensitive Text)
description} -> Maybe (Sensitive Text)
description) (\s :: UpdatePricingPlanResponse
s@UpdatePricingPlanResponse' {} Maybe (Sensitive Text)
a -> UpdatePricingPlanResponse
s {$sel:description:UpdatePricingPlanResponse' :: Maybe (Sensitive Text)
description = Maybe (Sensitive Text)
a} :: UpdatePricingPlanResponse) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping forall a. Iso' (Sensitive a) a
Data._Sensitive

-- | The most recent time when the pricing plan was modified.
updatePricingPlanResponse_lastModifiedTime :: Lens.Lens' UpdatePricingPlanResponse (Prelude.Maybe Prelude.Integer)
updatePricingPlanResponse_lastModifiedTime :: Lens' UpdatePricingPlanResponse (Maybe Integer)
updatePricingPlanResponse_lastModifiedTime = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdatePricingPlanResponse' {Maybe Integer
lastModifiedTime :: Maybe Integer
$sel:lastModifiedTime:UpdatePricingPlanResponse' :: UpdatePricingPlanResponse -> Maybe Integer
lastModifiedTime} -> Maybe Integer
lastModifiedTime) (\s :: UpdatePricingPlanResponse
s@UpdatePricingPlanResponse' {} Maybe Integer
a -> UpdatePricingPlanResponse
s {$sel:lastModifiedTime:UpdatePricingPlanResponse' :: Maybe Integer
lastModifiedTime = Maybe Integer
a} :: UpdatePricingPlanResponse)

-- | The name of the pricing plan. The name must be unique to each pricing
-- plan.
updatePricingPlanResponse_name :: Lens.Lens' UpdatePricingPlanResponse (Prelude.Maybe Prelude.Text)
updatePricingPlanResponse_name :: Lens' UpdatePricingPlanResponse (Maybe Text)
updatePricingPlanResponse_name = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdatePricingPlanResponse' {Maybe (Sensitive Text)
name :: Maybe (Sensitive Text)
$sel:name:UpdatePricingPlanResponse' :: UpdatePricingPlanResponse -> Maybe (Sensitive Text)
name} -> Maybe (Sensitive Text)
name) (\s :: UpdatePricingPlanResponse
s@UpdatePricingPlanResponse' {} Maybe (Sensitive Text)
a -> UpdatePricingPlanResponse
s {$sel:name:UpdatePricingPlanResponse' :: Maybe (Sensitive Text)
name = Maybe (Sensitive Text)
a} :: UpdatePricingPlanResponse) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping forall a. Iso' (Sensitive a) a
Data._Sensitive

-- | The pricing rules count that\'s currently associated with this pricing
-- plan list.
updatePricingPlanResponse_size :: Lens.Lens' UpdatePricingPlanResponse (Prelude.Maybe Prelude.Natural)
updatePricingPlanResponse_size :: Lens' UpdatePricingPlanResponse (Maybe Natural)
updatePricingPlanResponse_size = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdatePricingPlanResponse' {Maybe Natural
size :: Maybe Natural
$sel:size:UpdatePricingPlanResponse' :: UpdatePricingPlanResponse -> Maybe Natural
size} -> Maybe Natural
size) (\s :: UpdatePricingPlanResponse
s@UpdatePricingPlanResponse' {} Maybe Natural
a -> UpdatePricingPlanResponse
s {$sel:size:UpdatePricingPlanResponse' :: Maybe Natural
size = Maybe Natural
a} :: UpdatePricingPlanResponse)

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

instance Prelude.NFData UpdatePricingPlanResponse where
  rnf :: UpdatePricingPlanResponse -> ()
rnf UpdatePricingPlanResponse' {Int
Maybe Integer
Maybe Natural
Maybe Text
Maybe (Sensitive Text)
httpStatus :: Int
size :: Maybe Natural
name :: Maybe (Sensitive Text)
lastModifiedTime :: Maybe Integer
description :: Maybe (Sensitive Text)
arn :: Maybe Text
$sel:httpStatus:UpdatePricingPlanResponse' :: UpdatePricingPlanResponse -> Int
$sel:size:UpdatePricingPlanResponse' :: UpdatePricingPlanResponse -> Maybe Natural
$sel:name:UpdatePricingPlanResponse' :: UpdatePricingPlanResponse -> Maybe (Sensitive Text)
$sel:lastModifiedTime:UpdatePricingPlanResponse' :: UpdatePricingPlanResponse -> Maybe Integer
$sel:description:UpdatePricingPlanResponse' :: UpdatePricingPlanResponse -> Maybe (Sensitive Text)
$sel:arn:UpdatePricingPlanResponse' :: UpdatePricingPlanResponse -> Maybe Text
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
arn
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe (Sensitive Text)
description
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Integer
lastModifiedTime
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe (Sensitive Text)
name
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Natural
size
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Int
httpStatus