{-# 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.ServiceQuotas.ListRequestedServiceQuotaChangeHistoryByQuota
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
--
-- Retrieves the quota increase requests for the specified quota.
--
-- This operation returns paginated results.
module Amazonka.ServiceQuotas.ListRequestedServiceQuotaChangeHistoryByQuota
  ( -- * Creating a Request
    ListRequestedServiceQuotaChangeHistoryByQuota (..),
    newListRequestedServiceQuotaChangeHistoryByQuota,

    -- * Request Lenses
    listRequestedServiceQuotaChangeHistoryByQuota_maxResults,
    listRequestedServiceQuotaChangeHistoryByQuota_nextToken,
    listRequestedServiceQuotaChangeHistoryByQuota_status,
    listRequestedServiceQuotaChangeHistoryByQuota_serviceCode,
    listRequestedServiceQuotaChangeHistoryByQuota_quotaCode,

    -- * Destructuring the Response
    ListRequestedServiceQuotaChangeHistoryByQuotaResponse (..),
    newListRequestedServiceQuotaChangeHistoryByQuotaResponse,

    -- * Response Lenses
    listRequestedServiceQuotaChangeHistoryByQuotaResponse_nextToken,
    listRequestedServiceQuotaChangeHistoryByQuotaResponse_requestedQuotas,
    listRequestedServiceQuotaChangeHistoryByQuotaResponse_httpStatus,
  )
where

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
import Amazonka.ServiceQuotas.Types

-- | /See:/ 'newListRequestedServiceQuotaChangeHistoryByQuota' smart constructor.
data ListRequestedServiceQuotaChangeHistoryByQuota = ListRequestedServiceQuotaChangeHistoryByQuota'
  { -- | The maximum number of results to return with a single call. To retrieve
    -- the remaining results, if any, make another call with the token returned
    -- from this call.
    ListRequestedServiceQuotaChangeHistoryByQuota -> Maybe Natural
maxResults :: Prelude.Maybe Prelude.Natural,
    -- | The token for the next page of results.
    ListRequestedServiceQuotaChangeHistoryByQuota -> Maybe Text
nextToken :: Prelude.Maybe Prelude.Text,
    -- | The status value of the quota increase request.
    ListRequestedServiceQuotaChangeHistoryByQuota
-> Maybe RequestStatus
status :: Prelude.Maybe RequestStatus,
    -- | The service identifier.
    ListRequestedServiceQuotaChangeHistoryByQuota -> Text
serviceCode :: Prelude.Text,
    -- | The quota identifier.
    ListRequestedServiceQuotaChangeHistoryByQuota -> Text
quotaCode :: Prelude.Text
  }
  deriving (ListRequestedServiceQuotaChangeHistoryByQuota
-> ListRequestedServiceQuotaChangeHistoryByQuota -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: ListRequestedServiceQuotaChangeHistoryByQuota
-> ListRequestedServiceQuotaChangeHistoryByQuota -> Bool
$c/= :: ListRequestedServiceQuotaChangeHistoryByQuota
-> ListRequestedServiceQuotaChangeHistoryByQuota -> Bool
== :: ListRequestedServiceQuotaChangeHistoryByQuota
-> ListRequestedServiceQuotaChangeHistoryByQuota -> Bool
$c== :: ListRequestedServiceQuotaChangeHistoryByQuota
-> ListRequestedServiceQuotaChangeHistoryByQuota -> Bool
Prelude.Eq, ReadPrec [ListRequestedServiceQuotaChangeHistoryByQuota]
ReadPrec ListRequestedServiceQuotaChangeHistoryByQuota
Int -> ReadS ListRequestedServiceQuotaChangeHistoryByQuota
ReadS [ListRequestedServiceQuotaChangeHistoryByQuota]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [ListRequestedServiceQuotaChangeHistoryByQuota]
$creadListPrec :: ReadPrec [ListRequestedServiceQuotaChangeHistoryByQuota]
readPrec :: ReadPrec ListRequestedServiceQuotaChangeHistoryByQuota
$creadPrec :: ReadPrec ListRequestedServiceQuotaChangeHistoryByQuota
readList :: ReadS [ListRequestedServiceQuotaChangeHistoryByQuota]
$creadList :: ReadS [ListRequestedServiceQuotaChangeHistoryByQuota]
readsPrec :: Int -> ReadS ListRequestedServiceQuotaChangeHistoryByQuota
$creadsPrec :: Int -> ReadS ListRequestedServiceQuotaChangeHistoryByQuota
Prelude.Read, Int -> ListRequestedServiceQuotaChangeHistoryByQuota -> ShowS
[ListRequestedServiceQuotaChangeHistoryByQuota] -> ShowS
ListRequestedServiceQuotaChangeHistoryByQuota -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [ListRequestedServiceQuotaChangeHistoryByQuota] -> ShowS
$cshowList :: [ListRequestedServiceQuotaChangeHistoryByQuota] -> ShowS
show :: ListRequestedServiceQuotaChangeHistoryByQuota -> String
$cshow :: ListRequestedServiceQuotaChangeHistoryByQuota -> String
showsPrec :: Int -> ListRequestedServiceQuotaChangeHistoryByQuota -> ShowS
$cshowsPrec :: Int -> ListRequestedServiceQuotaChangeHistoryByQuota -> ShowS
Prelude.Show, forall x.
Rep ListRequestedServiceQuotaChangeHistoryByQuota x
-> ListRequestedServiceQuotaChangeHistoryByQuota
forall x.
ListRequestedServiceQuotaChangeHistoryByQuota
-> Rep ListRequestedServiceQuotaChangeHistoryByQuota x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep ListRequestedServiceQuotaChangeHistoryByQuota x
-> ListRequestedServiceQuotaChangeHistoryByQuota
$cfrom :: forall x.
ListRequestedServiceQuotaChangeHistoryByQuota
-> Rep ListRequestedServiceQuotaChangeHistoryByQuota x
Prelude.Generic)

-- |
-- Create a value of 'ListRequestedServiceQuotaChangeHistoryByQuota' 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:
--
-- 'maxResults', 'listRequestedServiceQuotaChangeHistoryByQuota_maxResults' - The maximum number of results to return with a single call. To retrieve
-- the remaining results, if any, make another call with the token returned
-- from this call.
--
-- 'nextToken', 'listRequestedServiceQuotaChangeHistoryByQuota_nextToken' - The token for the next page of results.
--
-- 'status', 'listRequestedServiceQuotaChangeHistoryByQuota_status' - The status value of the quota increase request.
--
-- 'serviceCode', 'listRequestedServiceQuotaChangeHistoryByQuota_serviceCode' - The service identifier.
--
-- 'quotaCode', 'listRequestedServiceQuotaChangeHistoryByQuota_quotaCode' - The quota identifier.
newListRequestedServiceQuotaChangeHistoryByQuota ::
  -- | 'serviceCode'
  Prelude.Text ->
  -- | 'quotaCode'
  Prelude.Text ->
  ListRequestedServiceQuotaChangeHistoryByQuota
newListRequestedServiceQuotaChangeHistoryByQuota :: Text -> Text -> ListRequestedServiceQuotaChangeHistoryByQuota
newListRequestedServiceQuotaChangeHistoryByQuota
  Text
pServiceCode_
  Text
pQuotaCode_ =
    ListRequestedServiceQuotaChangeHistoryByQuota'
      { $sel:maxResults:ListRequestedServiceQuotaChangeHistoryByQuota' :: Maybe Natural
maxResults =
          forall a. Maybe a
Prelude.Nothing,
        $sel:nextToken:ListRequestedServiceQuotaChangeHistoryByQuota' :: Maybe Text
nextToken = forall a. Maybe a
Prelude.Nothing,
        $sel:status:ListRequestedServiceQuotaChangeHistoryByQuota' :: Maybe RequestStatus
status = forall a. Maybe a
Prelude.Nothing,
        $sel:serviceCode:ListRequestedServiceQuotaChangeHistoryByQuota' :: Text
serviceCode = Text
pServiceCode_,
        $sel:quotaCode:ListRequestedServiceQuotaChangeHistoryByQuota' :: Text
quotaCode = Text
pQuotaCode_
      }

-- | The maximum number of results to return with a single call. To retrieve
-- the remaining results, if any, make another call with the token returned
-- from this call.
listRequestedServiceQuotaChangeHistoryByQuota_maxResults :: Lens.Lens' ListRequestedServiceQuotaChangeHistoryByQuota (Prelude.Maybe Prelude.Natural)
listRequestedServiceQuotaChangeHistoryByQuota_maxResults :: Lens' ListRequestedServiceQuotaChangeHistoryByQuota (Maybe Natural)
listRequestedServiceQuotaChangeHistoryByQuota_maxResults = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListRequestedServiceQuotaChangeHistoryByQuota' {Maybe Natural
maxResults :: Maybe Natural
$sel:maxResults:ListRequestedServiceQuotaChangeHistoryByQuota' :: ListRequestedServiceQuotaChangeHistoryByQuota -> Maybe Natural
maxResults} -> Maybe Natural
maxResults) (\s :: ListRequestedServiceQuotaChangeHistoryByQuota
s@ListRequestedServiceQuotaChangeHistoryByQuota' {} Maybe Natural
a -> ListRequestedServiceQuotaChangeHistoryByQuota
s {$sel:maxResults:ListRequestedServiceQuotaChangeHistoryByQuota' :: Maybe Natural
maxResults = Maybe Natural
a} :: ListRequestedServiceQuotaChangeHistoryByQuota)

-- | The token for the next page of results.
listRequestedServiceQuotaChangeHistoryByQuota_nextToken :: Lens.Lens' ListRequestedServiceQuotaChangeHistoryByQuota (Prelude.Maybe Prelude.Text)
listRequestedServiceQuotaChangeHistoryByQuota_nextToken :: Lens' ListRequestedServiceQuotaChangeHistoryByQuota (Maybe Text)
listRequestedServiceQuotaChangeHistoryByQuota_nextToken = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListRequestedServiceQuotaChangeHistoryByQuota' {Maybe Text
nextToken :: Maybe Text
$sel:nextToken:ListRequestedServiceQuotaChangeHistoryByQuota' :: ListRequestedServiceQuotaChangeHistoryByQuota -> Maybe Text
nextToken} -> Maybe Text
nextToken) (\s :: ListRequestedServiceQuotaChangeHistoryByQuota
s@ListRequestedServiceQuotaChangeHistoryByQuota' {} Maybe Text
a -> ListRequestedServiceQuotaChangeHistoryByQuota
s {$sel:nextToken:ListRequestedServiceQuotaChangeHistoryByQuota' :: Maybe Text
nextToken = Maybe Text
a} :: ListRequestedServiceQuotaChangeHistoryByQuota)

-- | The status value of the quota increase request.
listRequestedServiceQuotaChangeHistoryByQuota_status :: Lens.Lens' ListRequestedServiceQuotaChangeHistoryByQuota (Prelude.Maybe RequestStatus)
listRequestedServiceQuotaChangeHistoryByQuota_status :: Lens'
  ListRequestedServiceQuotaChangeHistoryByQuota (Maybe RequestStatus)
listRequestedServiceQuotaChangeHistoryByQuota_status = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListRequestedServiceQuotaChangeHistoryByQuota' {Maybe RequestStatus
status :: Maybe RequestStatus
$sel:status:ListRequestedServiceQuotaChangeHistoryByQuota' :: ListRequestedServiceQuotaChangeHistoryByQuota
-> Maybe RequestStatus
status} -> Maybe RequestStatus
status) (\s :: ListRequestedServiceQuotaChangeHistoryByQuota
s@ListRequestedServiceQuotaChangeHistoryByQuota' {} Maybe RequestStatus
a -> ListRequestedServiceQuotaChangeHistoryByQuota
s {$sel:status:ListRequestedServiceQuotaChangeHistoryByQuota' :: Maybe RequestStatus
status = Maybe RequestStatus
a} :: ListRequestedServiceQuotaChangeHistoryByQuota)

-- | The service identifier.
listRequestedServiceQuotaChangeHistoryByQuota_serviceCode :: Lens.Lens' ListRequestedServiceQuotaChangeHistoryByQuota Prelude.Text
listRequestedServiceQuotaChangeHistoryByQuota_serviceCode :: Lens' ListRequestedServiceQuotaChangeHistoryByQuota Text
listRequestedServiceQuotaChangeHistoryByQuota_serviceCode = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListRequestedServiceQuotaChangeHistoryByQuota' {Text
serviceCode :: Text
$sel:serviceCode:ListRequestedServiceQuotaChangeHistoryByQuota' :: ListRequestedServiceQuotaChangeHistoryByQuota -> Text
serviceCode} -> Text
serviceCode) (\s :: ListRequestedServiceQuotaChangeHistoryByQuota
s@ListRequestedServiceQuotaChangeHistoryByQuota' {} Text
a -> ListRequestedServiceQuotaChangeHistoryByQuota
s {$sel:serviceCode:ListRequestedServiceQuotaChangeHistoryByQuota' :: Text
serviceCode = Text
a} :: ListRequestedServiceQuotaChangeHistoryByQuota)

-- | The quota identifier.
listRequestedServiceQuotaChangeHistoryByQuota_quotaCode :: Lens.Lens' ListRequestedServiceQuotaChangeHistoryByQuota Prelude.Text
listRequestedServiceQuotaChangeHistoryByQuota_quotaCode :: Lens' ListRequestedServiceQuotaChangeHistoryByQuota Text
listRequestedServiceQuotaChangeHistoryByQuota_quotaCode = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListRequestedServiceQuotaChangeHistoryByQuota' {Text
quotaCode :: Text
$sel:quotaCode:ListRequestedServiceQuotaChangeHistoryByQuota' :: ListRequestedServiceQuotaChangeHistoryByQuota -> Text
quotaCode} -> Text
quotaCode) (\s :: ListRequestedServiceQuotaChangeHistoryByQuota
s@ListRequestedServiceQuotaChangeHistoryByQuota' {} Text
a -> ListRequestedServiceQuotaChangeHistoryByQuota
s {$sel:quotaCode:ListRequestedServiceQuotaChangeHistoryByQuota' :: Text
quotaCode = Text
a} :: ListRequestedServiceQuotaChangeHistoryByQuota)

instance
  Core.AWSPager
    ListRequestedServiceQuotaChangeHistoryByQuota
  where
  page :: ListRequestedServiceQuotaChangeHistoryByQuota
-> AWSResponse ListRequestedServiceQuotaChangeHistoryByQuota
-> Maybe ListRequestedServiceQuotaChangeHistoryByQuota
page ListRequestedServiceQuotaChangeHistoryByQuota
rq AWSResponse ListRequestedServiceQuotaChangeHistoryByQuota
rs
    | forall a. AWSTruncated a => a -> Bool
Core.stop
        ( AWSResponse ListRequestedServiceQuotaChangeHistoryByQuota
rs
            forall s a. s -> Getting (First a) s a -> Maybe a
Lens.^? Lens'
  ListRequestedServiceQuotaChangeHistoryByQuotaResponse (Maybe Text)
listRequestedServiceQuotaChangeHistoryByQuotaResponse_nextToken
            forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall a b. Prism (Maybe a) (Maybe b) a b
Lens._Just
        ) =
        forall a. Maybe a
Prelude.Nothing
    | forall a. AWSTruncated a => a -> Bool
Core.stop
        ( AWSResponse ListRequestedServiceQuotaChangeHistoryByQuota
rs
            forall s a. s -> Getting (First a) s a -> Maybe a
Lens.^? Lens'
  ListRequestedServiceQuotaChangeHistoryByQuotaResponse
  (Maybe [RequestedServiceQuotaChange])
listRequestedServiceQuotaChangeHistoryByQuotaResponse_requestedQuotas
            forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall a b. Prism (Maybe a) (Maybe b) a b
Lens._Just
        ) =
        forall a. Maybe a
Prelude.Nothing
    | Bool
Prelude.otherwise =
        forall a. a -> Maybe a
Prelude.Just
          forall a b. (a -> b) -> a -> b
Prelude.$ ListRequestedServiceQuotaChangeHistoryByQuota
rq
          forall a b. a -> (a -> b) -> b
Prelude.& Lens' ListRequestedServiceQuotaChangeHistoryByQuota (Maybe Text)
listRequestedServiceQuotaChangeHistoryByQuota_nextToken
          forall s t a b. ASetter s t a b -> b -> s -> t
Lens..~ AWSResponse ListRequestedServiceQuotaChangeHistoryByQuota
rs
          forall s a. s -> Getting (First a) s a -> Maybe a
Lens.^? Lens'
  ListRequestedServiceQuotaChangeHistoryByQuotaResponse (Maybe Text)
listRequestedServiceQuotaChangeHistoryByQuotaResponse_nextToken
          forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall a b. Prism (Maybe a) (Maybe b) a b
Lens._Just

instance
  Core.AWSRequest
    ListRequestedServiceQuotaChangeHistoryByQuota
  where
  type
    AWSResponse
      ListRequestedServiceQuotaChangeHistoryByQuota =
      ListRequestedServiceQuotaChangeHistoryByQuotaResponse
  request :: (Service -> Service)
-> ListRequestedServiceQuotaChangeHistoryByQuota
-> Request ListRequestedServiceQuotaChangeHistoryByQuota
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 ListRequestedServiceQuotaChangeHistoryByQuota
-> ClientResponse ClientBody
-> m (Either
        Error
        (ClientResponse
           (AWSResponse ListRequestedServiceQuotaChangeHistoryByQuota)))
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 [RequestedServiceQuotaChange]
-> Int
-> ListRequestedServiceQuotaChangeHistoryByQuotaResponse
ListRequestedServiceQuotaChangeHistoryByQuotaResponse'
            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
"NextToken")
            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
"RequestedQuotas"
                            forall (f :: * -> *) a. Functor f => f (Maybe a) -> a -> f a
Core..!@ forall a. Monoid a => a
Prelude.mempty
                        )
            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
    ListRequestedServiceQuotaChangeHistoryByQuota
  where
  hashWithSalt :: Int -> ListRequestedServiceQuotaChangeHistoryByQuota -> Int
hashWithSalt
    Int
_salt
    ListRequestedServiceQuotaChangeHistoryByQuota' {Maybe Natural
Maybe Text
Maybe RequestStatus
Text
quotaCode :: Text
serviceCode :: Text
status :: Maybe RequestStatus
nextToken :: Maybe Text
maxResults :: Maybe Natural
$sel:quotaCode:ListRequestedServiceQuotaChangeHistoryByQuota' :: ListRequestedServiceQuotaChangeHistoryByQuota -> Text
$sel:serviceCode:ListRequestedServiceQuotaChangeHistoryByQuota' :: ListRequestedServiceQuotaChangeHistoryByQuota -> Text
$sel:status:ListRequestedServiceQuotaChangeHistoryByQuota' :: ListRequestedServiceQuotaChangeHistoryByQuota
-> Maybe RequestStatus
$sel:nextToken:ListRequestedServiceQuotaChangeHistoryByQuota' :: ListRequestedServiceQuotaChangeHistoryByQuota -> Maybe Text
$sel:maxResults:ListRequestedServiceQuotaChangeHistoryByQuota' :: ListRequestedServiceQuotaChangeHistoryByQuota -> Maybe Natural
..} =
      Int
_salt
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Natural
maxResults
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
nextToken
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe RequestStatus
status
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
serviceCode
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
quotaCode

instance
  Prelude.NFData
    ListRequestedServiceQuotaChangeHistoryByQuota
  where
  rnf :: ListRequestedServiceQuotaChangeHistoryByQuota -> ()
rnf
    ListRequestedServiceQuotaChangeHistoryByQuota' {Maybe Natural
Maybe Text
Maybe RequestStatus
Text
quotaCode :: Text
serviceCode :: Text
status :: Maybe RequestStatus
nextToken :: Maybe Text
maxResults :: Maybe Natural
$sel:quotaCode:ListRequestedServiceQuotaChangeHistoryByQuota' :: ListRequestedServiceQuotaChangeHistoryByQuota -> Text
$sel:serviceCode:ListRequestedServiceQuotaChangeHistoryByQuota' :: ListRequestedServiceQuotaChangeHistoryByQuota -> Text
$sel:status:ListRequestedServiceQuotaChangeHistoryByQuota' :: ListRequestedServiceQuotaChangeHistoryByQuota
-> Maybe RequestStatus
$sel:nextToken:ListRequestedServiceQuotaChangeHistoryByQuota' :: ListRequestedServiceQuotaChangeHistoryByQuota -> Maybe Text
$sel:maxResults:ListRequestedServiceQuotaChangeHistoryByQuota' :: ListRequestedServiceQuotaChangeHistoryByQuota -> Maybe Natural
..} =
      forall a. NFData a => a -> ()
Prelude.rnf Maybe Natural
maxResults
        seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
nextToken
        seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe RequestStatus
status
        seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Text
serviceCode
        seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Text
quotaCode

instance
  Data.ToHeaders
    ListRequestedServiceQuotaChangeHistoryByQuota
  where
  toHeaders :: ListRequestedServiceQuotaChangeHistoryByQuota -> 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
"ServiceQuotasV20190624.ListRequestedServiceQuotaChangeHistoryByQuota" ::
                          Prelude.ByteString
                      ),
            HeaderName
"Content-Type"
              forall a. ToHeader a => HeaderName -> a -> ResponseHeaders
Data.=# ( ByteString
"application/x-amz-json-1.1" ::
                          Prelude.ByteString
                      )
          ]
      )

instance
  Data.ToJSON
    ListRequestedServiceQuotaChangeHistoryByQuota
  where
  toJSON :: ListRequestedServiceQuotaChangeHistoryByQuota -> Value
toJSON
    ListRequestedServiceQuotaChangeHistoryByQuota' {Maybe Natural
Maybe Text
Maybe RequestStatus
Text
quotaCode :: Text
serviceCode :: Text
status :: Maybe RequestStatus
nextToken :: Maybe Text
maxResults :: Maybe Natural
$sel:quotaCode:ListRequestedServiceQuotaChangeHistoryByQuota' :: ListRequestedServiceQuotaChangeHistoryByQuota -> Text
$sel:serviceCode:ListRequestedServiceQuotaChangeHistoryByQuota' :: ListRequestedServiceQuotaChangeHistoryByQuota -> Text
$sel:status:ListRequestedServiceQuotaChangeHistoryByQuota' :: ListRequestedServiceQuotaChangeHistoryByQuota
-> Maybe RequestStatus
$sel:nextToken:ListRequestedServiceQuotaChangeHistoryByQuota' :: ListRequestedServiceQuotaChangeHistoryByQuota -> Maybe Text
$sel:maxResults:ListRequestedServiceQuotaChangeHistoryByQuota' :: ListRequestedServiceQuotaChangeHistoryByQuota -> Maybe Natural
..} =
      [Pair] -> Value
Data.object
        ( forall a. [Maybe a] -> [a]
Prelude.catMaybes
            [ (Key
"MaxResults" 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 Natural
maxResults,
              (Key
"NextToken" 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
nextToken,
              (Key
"Status" 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 RequestStatus
status,
              forall a. a -> Maybe a
Prelude.Just (Key
"ServiceCode" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..= Text
serviceCode),
              forall a. a -> Maybe a
Prelude.Just (Key
"QuotaCode" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..= Text
quotaCode)
            ]
        )

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

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

-- | /See:/ 'newListRequestedServiceQuotaChangeHistoryByQuotaResponse' smart constructor.
data ListRequestedServiceQuotaChangeHistoryByQuotaResponse = ListRequestedServiceQuotaChangeHistoryByQuotaResponse'
  { -- | The token to use to retrieve the next page of results. This value is
    -- null when there are no more results to return.
    ListRequestedServiceQuotaChangeHistoryByQuotaResponse -> Maybe Text
nextToken :: Prelude.Maybe Prelude.Text,
    -- | Information about the quota increase requests.
    ListRequestedServiceQuotaChangeHistoryByQuotaResponse
-> Maybe [RequestedServiceQuotaChange]
requestedQuotas :: Prelude.Maybe [RequestedServiceQuotaChange],
    -- | The response's http status code.
    ListRequestedServiceQuotaChangeHistoryByQuotaResponse -> Int
httpStatus :: Prelude.Int
  }
  deriving (ListRequestedServiceQuotaChangeHistoryByQuotaResponse
-> ListRequestedServiceQuotaChangeHistoryByQuotaResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: ListRequestedServiceQuotaChangeHistoryByQuotaResponse
-> ListRequestedServiceQuotaChangeHistoryByQuotaResponse -> Bool
$c/= :: ListRequestedServiceQuotaChangeHistoryByQuotaResponse
-> ListRequestedServiceQuotaChangeHistoryByQuotaResponse -> Bool
== :: ListRequestedServiceQuotaChangeHistoryByQuotaResponse
-> ListRequestedServiceQuotaChangeHistoryByQuotaResponse -> Bool
$c== :: ListRequestedServiceQuotaChangeHistoryByQuotaResponse
-> ListRequestedServiceQuotaChangeHistoryByQuotaResponse -> Bool
Prelude.Eq, ReadPrec [ListRequestedServiceQuotaChangeHistoryByQuotaResponse]
ReadPrec ListRequestedServiceQuotaChangeHistoryByQuotaResponse
Int -> ReadS ListRequestedServiceQuotaChangeHistoryByQuotaResponse
ReadS [ListRequestedServiceQuotaChangeHistoryByQuotaResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [ListRequestedServiceQuotaChangeHistoryByQuotaResponse]
$creadListPrec :: ReadPrec [ListRequestedServiceQuotaChangeHistoryByQuotaResponse]
readPrec :: ReadPrec ListRequestedServiceQuotaChangeHistoryByQuotaResponse
$creadPrec :: ReadPrec ListRequestedServiceQuotaChangeHistoryByQuotaResponse
readList :: ReadS [ListRequestedServiceQuotaChangeHistoryByQuotaResponse]
$creadList :: ReadS [ListRequestedServiceQuotaChangeHistoryByQuotaResponse]
readsPrec :: Int -> ReadS ListRequestedServiceQuotaChangeHistoryByQuotaResponse
$creadsPrec :: Int -> ReadS ListRequestedServiceQuotaChangeHistoryByQuotaResponse
Prelude.Read, Int
-> ListRequestedServiceQuotaChangeHistoryByQuotaResponse -> ShowS
[ListRequestedServiceQuotaChangeHistoryByQuotaResponse] -> ShowS
ListRequestedServiceQuotaChangeHistoryByQuotaResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [ListRequestedServiceQuotaChangeHistoryByQuotaResponse] -> ShowS
$cshowList :: [ListRequestedServiceQuotaChangeHistoryByQuotaResponse] -> ShowS
show :: ListRequestedServiceQuotaChangeHistoryByQuotaResponse -> String
$cshow :: ListRequestedServiceQuotaChangeHistoryByQuotaResponse -> String
showsPrec :: Int
-> ListRequestedServiceQuotaChangeHistoryByQuotaResponse -> ShowS
$cshowsPrec :: Int
-> ListRequestedServiceQuotaChangeHistoryByQuotaResponse -> ShowS
Prelude.Show, forall x.
Rep ListRequestedServiceQuotaChangeHistoryByQuotaResponse x
-> ListRequestedServiceQuotaChangeHistoryByQuotaResponse
forall x.
ListRequestedServiceQuotaChangeHistoryByQuotaResponse
-> Rep ListRequestedServiceQuotaChangeHistoryByQuotaResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep ListRequestedServiceQuotaChangeHistoryByQuotaResponse x
-> ListRequestedServiceQuotaChangeHistoryByQuotaResponse
$cfrom :: forall x.
ListRequestedServiceQuotaChangeHistoryByQuotaResponse
-> Rep ListRequestedServiceQuotaChangeHistoryByQuotaResponse x
Prelude.Generic)

-- |
-- Create a value of 'ListRequestedServiceQuotaChangeHistoryByQuotaResponse' 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:
--
-- 'nextToken', 'listRequestedServiceQuotaChangeHistoryByQuotaResponse_nextToken' - The token to use to retrieve the next page of results. This value is
-- null when there are no more results to return.
--
-- 'requestedQuotas', 'listRequestedServiceQuotaChangeHistoryByQuotaResponse_requestedQuotas' - Information about the quota increase requests.
--
-- 'httpStatus', 'listRequestedServiceQuotaChangeHistoryByQuotaResponse_httpStatus' - The response's http status code.
newListRequestedServiceQuotaChangeHistoryByQuotaResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  ListRequestedServiceQuotaChangeHistoryByQuotaResponse
newListRequestedServiceQuotaChangeHistoryByQuotaResponse :: Int -> ListRequestedServiceQuotaChangeHistoryByQuotaResponse
newListRequestedServiceQuotaChangeHistoryByQuotaResponse
  Int
pHttpStatus_ =
    ListRequestedServiceQuotaChangeHistoryByQuotaResponse'
      { $sel:nextToken:ListRequestedServiceQuotaChangeHistoryByQuotaResponse' :: Maybe Text
nextToken =
          forall a. Maybe a
Prelude.Nothing,
        $sel:requestedQuotas:ListRequestedServiceQuotaChangeHistoryByQuotaResponse' :: Maybe [RequestedServiceQuotaChange]
requestedQuotas =
          forall a. Maybe a
Prelude.Nothing,
        $sel:httpStatus:ListRequestedServiceQuotaChangeHistoryByQuotaResponse' :: Int
httpStatus =
          Int
pHttpStatus_
      }

-- | The token to use to retrieve the next page of results. This value is
-- null when there are no more results to return.
listRequestedServiceQuotaChangeHistoryByQuotaResponse_nextToken :: Lens.Lens' ListRequestedServiceQuotaChangeHistoryByQuotaResponse (Prelude.Maybe Prelude.Text)
listRequestedServiceQuotaChangeHistoryByQuotaResponse_nextToken :: Lens'
  ListRequestedServiceQuotaChangeHistoryByQuotaResponse (Maybe Text)
listRequestedServiceQuotaChangeHistoryByQuotaResponse_nextToken = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListRequestedServiceQuotaChangeHistoryByQuotaResponse' {Maybe Text
nextToken :: Maybe Text
$sel:nextToken:ListRequestedServiceQuotaChangeHistoryByQuotaResponse' :: ListRequestedServiceQuotaChangeHistoryByQuotaResponse -> Maybe Text
nextToken} -> Maybe Text
nextToken) (\s :: ListRequestedServiceQuotaChangeHistoryByQuotaResponse
s@ListRequestedServiceQuotaChangeHistoryByQuotaResponse' {} Maybe Text
a -> ListRequestedServiceQuotaChangeHistoryByQuotaResponse
s {$sel:nextToken:ListRequestedServiceQuotaChangeHistoryByQuotaResponse' :: Maybe Text
nextToken = Maybe Text
a} :: ListRequestedServiceQuotaChangeHistoryByQuotaResponse)

-- | Information about the quota increase requests.
listRequestedServiceQuotaChangeHistoryByQuotaResponse_requestedQuotas :: Lens.Lens' ListRequestedServiceQuotaChangeHistoryByQuotaResponse (Prelude.Maybe [RequestedServiceQuotaChange])
listRequestedServiceQuotaChangeHistoryByQuotaResponse_requestedQuotas :: Lens'
  ListRequestedServiceQuotaChangeHistoryByQuotaResponse
  (Maybe [RequestedServiceQuotaChange])
listRequestedServiceQuotaChangeHistoryByQuotaResponse_requestedQuotas = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListRequestedServiceQuotaChangeHistoryByQuotaResponse' {Maybe [RequestedServiceQuotaChange]
requestedQuotas :: Maybe [RequestedServiceQuotaChange]
$sel:requestedQuotas:ListRequestedServiceQuotaChangeHistoryByQuotaResponse' :: ListRequestedServiceQuotaChangeHistoryByQuotaResponse
-> Maybe [RequestedServiceQuotaChange]
requestedQuotas} -> Maybe [RequestedServiceQuotaChange]
requestedQuotas) (\s :: ListRequestedServiceQuotaChangeHistoryByQuotaResponse
s@ListRequestedServiceQuotaChangeHistoryByQuotaResponse' {} Maybe [RequestedServiceQuotaChange]
a -> ListRequestedServiceQuotaChangeHistoryByQuotaResponse
s {$sel:requestedQuotas:ListRequestedServiceQuotaChangeHistoryByQuotaResponse' :: Maybe [RequestedServiceQuotaChange]
requestedQuotas = Maybe [RequestedServiceQuotaChange]
a} :: ListRequestedServiceQuotaChangeHistoryByQuotaResponse) 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 s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced

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

instance
  Prelude.NFData
    ListRequestedServiceQuotaChangeHistoryByQuotaResponse
  where
  rnf :: ListRequestedServiceQuotaChangeHistoryByQuotaResponse -> ()
rnf
    ListRequestedServiceQuotaChangeHistoryByQuotaResponse' {Int
Maybe [RequestedServiceQuotaChange]
Maybe Text
httpStatus :: Int
requestedQuotas :: Maybe [RequestedServiceQuotaChange]
nextToken :: Maybe Text
$sel:httpStatus:ListRequestedServiceQuotaChangeHistoryByQuotaResponse' :: ListRequestedServiceQuotaChangeHistoryByQuotaResponse -> Int
$sel:requestedQuotas:ListRequestedServiceQuotaChangeHistoryByQuotaResponse' :: ListRequestedServiceQuotaChangeHistoryByQuotaResponse
-> Maybe [RequestedServiceQuotaChange]
$sel:nextToken:ListRequestedServiceQuotaChangeHistoryByQuotaResponse' :: ListRequestedServiceQuotaChangeHistoryByQuotaResponse -> Maybe Text
..} =
      forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
nextToken
        seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [RequestedServiceQuotaChange]
requestedQuotas
        seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Int
httpStatus