{-# 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.KinesisAnalyticsV2.ListApplicationVersions
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
--
-- Lists all the versions for the specified application, including versions
-- that were rolled back. The response also includes a summary of the
-- configuration associated with each version.
--
-- To get the complete description of a specific application version,
-- invoke the DescribeApplicationVersion operation.
--
-- This operation is supported only for Amazon Kinesis Data Analytics for
-- Apache Flink.
module Amazonka.KinesisAnalyticsV2.ListApplicationVersions
  ( -- * Creating a Request
    ListApplicationVersions (..),
    newListApplicationVersions,

    -- * Request Lenses
    listApplicationVersions_limit,
    listApplicationVersions_nextToken,
    listApplicationVersions_applicationName,

    -- * Destructuring the Response
    ListApplicationVersionsResponse (..),
    newListApplicationVersionsResponse,

    -- * Response Lenses
    listApplicationVersionsResponse_applicationVersionSummaries,
    listApplicationVersionsResponse_nextToken,
    listApplicationVersionsResponse_httpStatus,
  )
where

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

-- | /See:/ 'newListApplicationVersions' smart constructor.
data ListApplicationVersions = ListApplicationVersions'
  { -- | The maximum number of versions to list in this invocation of the
    -- operation.
    ListApplicationVersions -> Maybe Natural
limit :: Prelude.Maybe Prelude.Natural,
    -- | If a previous invocation of this operation returned a pagination token,
    -- pass it into this value to retrieve the next set of results. For more
    -- information about pagination, see
    -- <https://docs.aws.amazon.com/cli/latest/userguide/pagination.html Using the Amazon Command Line Interface\'s Pagination Options>.
    ListApplicationVersions -> Maybe Text
nextToken :: Prelude.Maybe Prelude.Text,
    -- | The name of the application for which you want to list all versions.
    ListApplicationVersions -> Text
applicationName :: Prelude.Text
  }
  deriving (ListApplicationVersions -> ListApplicationVersions -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: ListApplicationVersions -> ListApplicationVersions -> Bool
$c/= :: ListApplicationVersions -> ListApplicationVersions -> Bool
== :: ListApplicationVersions -> ListApplicationVersions -> Bool
$c== :: ListApplicationVersions -> ListApplicationVersions -> Bool
Prelude.Eq, ReadPrec [ListApplicationVersions]
ReadPrec ListApplicationVersions
Int -> ReadS ListApplicationVersions
ReadS [ListApplicationVersions]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [ListApplicationVersions]
$creadListPrec :: ReadPrec [ListApplicationVersions]
readPrec :: ReadPrec ListApplicationVersions
$creadPrec :: ReadPrec ListApplicationVersions
readList :: ReadS [ListApplicationVersions]
$creadList :: ReadS [ListApplicationVersions]
readsPrec :: Int -> ReadS ListApplicationVersions
$creadsPrec :: Int -> ReadS ListApplicationVersions
Prelude.Read, Int -> ListApplicationVersions -> ShowS
[ListApplicationVersions] -> ShowS
ListApplicationVersions -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [ListApplicationVersions] -> ShowS
$cshowList :: [ListApplicationVersions] -> ShowS
show :: ListApplicationVersions -> String
$cshow :: ListApplicationVersions -> String
showsPrec :: Int -> ListApplicationVersions -> ShowS
$cshowsPrec :: Int -> ListApplicationVersions -> ShowS
Prelude.Show, forall x. Rep ListApplicationVersions x -> ListApplicationVersions
forall x. ListApplicationVersions -> Rep ListApplicationVersions x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep ListApplicationVersions x -> ListApplicationVersions
$cfrom :: forall x. ListApplicationVersions -> Rep ListApplicationVersions x
Prelude.Generic)

-- |
-- Create a value of 'ListApplicationVersions' 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:
--
-- 'limit', 'listApplicationVersions_limit' - The maximum number of versions to list in this invocation of the
-- operation.
--
-- 'nextToken', 'listApplicationVersions_nextToken' - If a previous invocation of this operation returned a pagination token,
-- pass it into this value to retrieve the next set of results. For more
-- information about pagination, see
-- <https://docs.aws.amazon.com/cli/latest/userguide/pagination.html Using the Amazon Command Line Interface\'s Pagination Options>.
--
-- 'applicationName', 'listApplicationVersions_applicationName' - The name of the application for which you want to list all versions.
newListApplicationVersions ::
  -- | 'applicationName'
  Prelude.Text ->
  ListApplicationVersions
newListApplicationVersions :: Text -> ListApplicationVersions
newListApplicationVersions Text
pApplicationName_ =
  ListApplicationVersions'
    { $sel:limit:ListApplicationVersions' :: Maybe Natural
limit = forall a. Maybe a
Prelude.Nothing,
      $sel:nextToken:ListApplicationVersions' :: Maybe Text
nextToken = forall a. Maybe a
Prelude.Nothing,
      $sel:applicationName:ListApplicationVersions' :: Text
applicationName = Text
pApplicationName_
    }

-- | The maximum number of versions to list in this invocation of the
-- operation.
listApplicationVersions_limit :: Lens.Lens' ListApplicationVersions (Prelude.Maybe Prelude.Natural)
listApplicationVersions_limit :: Lens' ListApplicationVersions (Maybe Natural)
listApplicationVersions_limit = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListApplicationVersions' {Maybe Natural
limit :: Maybe Natural
$sel:limit:ListApplicationVersions' :: ListApplicationVersions -> Maybe Natural
limit} -> Maybe Natural
limit) (\s :: ListApplicationVersions
s@ListApplicationVersions' {} Maybe Natural
a -> ListApplicationVersions
s {$sel:limit:ListApplicationVersions' :: Maybe Natural
limit = Maybe Natural
a} :: ListApplicationVersions)

-- | If a previous invocation of this operation returned a pagination token,
-- pass it into this value to retrieve the next set of results. For more
-- information about pagination, see
-- <https://docs.aws.amazon.com/cli/latest/userguide/pagination.html Using the Amazon Command Line Interface\'s Pagination Options>.
listApplicationVersions_nextToken :: Lens.Lens' ListApplicationVersions (Prelude.Maybe Prelude.Text)
listApplicationVersions_nextToken :: Lens' ListApplicationVersions (Maybe Text)
listApplicationVersions_nextToken = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListApplicationVersions' {Maybe Text
nextToken :: Maybe Text
$sel:nextToken:ListApplicationVersions' :: ListApplicationVersions -> Maybe Text
nextToken} -> Maybe Text
nextToken) (\s :: ListApplicationVersions
s@ListApplicationVersions' {} Maybe Text
a -> ListApplicationVersions
s {$sel:nextToken:ListApplicationVersions' :: Maybe Text
nextToken = Maybe Text
a} :: ListApplicationVersions)

-- | The name of the application for which you want to list all versions.
listApplicationVersions_applicationName :: Lens.Lens' ListApplicationVersions Prelude.Text
listApplicationVersions_applicationName :: Lens' ListApplicationVersions Text
listApplicationVersions_applicationName = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListApplicationVersions' {Text
applicationName :: Text
$sel:applicationName:ListApplicationVersions' :: ListApplicationVersions -> Text
applicationName} -> Text
applicationName) (\s :: ListApplicationVersions
s@ListApplicationVersions' {} Text
a -> ListApplicationVersions
s {$sel:applicationName:ListApplicationVersions' :: Text
applicationName = Text
a} :: ListApplicationVersions)

instance Core.AWSRequest ListApplicationVersions where
  type
    AWSResponse ListApplicationVersions =
      ListApplicationVersionsResponse
  request :: (Service -> Service)
-> ListApplicationVersions -> Request ListApplicationVersions
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 ListApplicationVersions
-> ClientResponse ClientBody
-> m (Either
        Error (ClientResponse (AWSResponse ListApplicationVersions)))
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 [ApplicationVersionSummary]
-> Maybe Text -> Int -> ListApplicationVersionsResponse
ListApplicationVersionsResponse'
            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
"ApplicationVersionSummaries"
                            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.<*> (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.<*> (forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure (forall a. Enum a => a -> Int
Prelude.fromEnum Int
s))
      )

instance Prelude.Hashable ListApplicationVersions where
  hashWithSalt :: Int -> ListApplicationVersions -> Int
hashWithSalt Int
_salt ListApplicationVersions' {Maybe Natural
Maybe Text
Text
applicationName :: Text
nextToken :: Maybe Text
limit :: Maybe Natural
$sel:applicationName:ListApplicationVersions' :: ListApplicationVersions -> Text
$sel:nextToken:ListApplicationVersions' :: ListApplicationVersions -> Maybe Text
$sel:limit:ListApplicationVersions' :: ListApplicationVersions -> Maybe Natural
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Natural
limit
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
nextToken
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
applicationName

instance Prelude.NFData ListApplicationVersions where
  rnf :: ListApplicationVersions -> ()
rnf ListApplicationVersions' {Maybe Natural
Maybe Text
Text
applicationName :: Text
nextToken :: Maybe Text
limit :: Maybe Natural
$sel:applicationName:ListApplicationVersions' :: ListApplicationVersions -> Text
$sel:nextToken:ListApplicationVersions' :: ListApplicationVersions -> Maybe Text
$sel:limit:ListApplicationVersions' :: ListApplicationVersions -> Maybe Natural
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Natural
limit
      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 Text
applicationName

instance Data.ToHeaders ListApplicationVersions where
  toHeaders :: ListApplicationVersions -> 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
"KinesisAnalytics_20180523.ListApplicationVersions" ::
                          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 ListApplicationVersions where
  toJSON :: ListApplicationVersions -> Value
toJSON ListApplicationVersions' {Maybe Natural
Maybe Text
Text
applicationName :: Text
nextToken :: Maybe Text
limit :: Maybe Natural
$sel:applicationName:ListApplicationVersions' :: ListApplicationVersions -> Text
$sel:nextToken:ListApplicationVersions' :: ListApplicationVersions -> Maybe Text
$sel:limit:ListApplicationVersions' :: ListApplicationVersions -> Maybe Natural
..} =
    [Pair] -> Value
Data.object
      ( forall a. [Maybe a] -> [a]
Prelude.catMaybes
          [ (Key
"Limit" 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
limit,
            (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,
            forall a. a -> Maybe a
Prelude.Just
              (Key
"ApplicationName" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..= Text
applicationName)
          ]
      )

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

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

-- | /See:/ 'newListApplicationVersionsResponse' smart constructor.
data ListApplicationVersionsResponse = ListApplicationVersionsResponse'
  { -- | A list of the application versions and the associated configuration
    -- summaries. The list includes application versions that were rolled back.
    --
    -- To get the complete description of a specific application version,
    -- invoke the DescribeApplicationVersion operation.
    ListApplicationVersionsResponse
-> Maybe [ApplicationVersionSummary]
applicationVersionSummaries :: Prelude.Maybe [ApplicationVersionSummary],
    -- | The pagination token for the next set of results, or @null@ if there are
    -- no additional results. To retrieve the next set of items, pass this
    -- token into a subsequent invocation of this operation. For more
    -- information about pagination, see
    -- <https://docs.aws.amazon.com/cli/latest/userguide/pagination.html Using the Amazon Command Line Interface\'s Pagination Options>.
    ListApplicationVersionsResponse -> Maybe Text
nextToken :: Prelude.Maybe Prelude.Text,
    -- | The response's http status code.
    ListApplicationVersionsResponse -> Int
httpStatus :: Prelude.Int
  }
  deriving (ListApplicationVersionsResponse
-> ListApplicationVersionsResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: ListApplicationVersionsResponse
-> ListApplicationVersionsResponse -> Bool
$c/= :: ListApplicationVersionsResponse
-> ListApplicationVersionsResponse -> Bool
== :: ListApplicationVersionsResponse
-> ListApplicationVersionsResponse -> Bool
$c== :: ListApplicationVersionsResponse
-> ListApplicationVersionsResponse -> Bool
Prelude.Eq, ReadPrec [ListApplicationVersionsResponse]
ReadPrec ListApplicationVersionsResponse
Int -> ReadS ListApplicationVersionsResponse
ReadS [ListApplicationVersionsResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [ListApplicationVersionsResponse]
$creadListPrec :: ReadPrec [ListApplicationVersionsResponse]
readPrec :: ReadPrec ListApplicationVersionsResponse
$creadPrec :: ReadPrec ListApplicationVersionsResponse
readList :: ReadS [ListApplicationVersionsResponse]
$creadList :: ReadS [ListApplicationVersionsResponse]
readsPrec :: Int -> ReadS ListApplicationVersionsResponse
$creadsPrec :: Int -> ReadS ListApplicationVersionsResponse
Prelude.Read, Int -> ListApplicationVersionsResponse -> ShowS
[ListApplicationVersionsResponse] -> ShowS
ListApplicationVersionsResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [ListApplicationVersionsResponse] -> ShowS
$cshowList :: [ListApplicationVersionsResponse] -> ShowS
show :: ListApplicationVersionsResponse -> String
$cshow :: ListApplicationVersionsResponse -> String
showsPrec :: Int -> ListApplicationVersionsResponse -> ShowS
$cshowsPrec :: Int -> ListApplicationVersionsResponse -> ShowS
Prelude.Show, forall x.
Rep ListApplicationVersionsResponse x
-> ListApplicationVersionsResponse
forall x.
ListApplicationVersionsResponse
-> Rep ListApplicationVersionsResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep ListApplicationVersionsResponse x
-> ListApplicationVersionsResponse
$cfrom :: forall x.
ListApplicationVersionsResponse
-> Rep ListApplicationVersionsResponse x
Prelude.Generic)

-- |
-- Create a value of 'ListApplicationVersionsResponse' 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:
--
-- 'applicationVersionSummaries', 'listApplicationVersionsResponse_applicationVersionSummaries' - A list of the application versions and the associated configuration
-- summaries. The list includes application versions that were rolled back.
--
-- To get the complete description of a specific application version,
-- invoke the DescribeApplicationVersion operation.
--
-- 'nextToken', 'listApplicationVersionsResponse_nextToken' - The pagination token for the next set of results, or @null@ if there are
-- no additional results. To retrieve the next set of items, pass this
-- token into a subsequent invocation of this operation. For more
-- information about pagination, see
-- <https://docs.aws.amazon.com/cli/latest/userguide/pagination.html Using the Amazon Command Line Interface\'s Pagination Options>.
--
-- 'httpStatus', 'listApplicationVersionsResponse_httpStatus' - The response's http status code.
newListApplicationVersionsResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  ListApplicationVersionsResponse
newListApplicationVersionsResponse :: Int -> ListApplicationVersionsResponse
newListApplicationVersionsResponse Int
pHttpStatus_ =
  ListApplicationVersionsResponse'
    { $sel:applicationVersionSummaries:ListApplicationVersionsResponse' :: Maybe [ApplicationVersionSummary]
applicationVersionSummaries =
        forall a. Maybe a
Prelude.Nothing,
      $sel:nextToken:ListApplicationVersionsResponse' :: Maybe Text
nextToken = forall a. Maybe a
Prelude.Nothing,
      $sel:httpStatus:ListApplicationVersionsResponse' :: Int
httpStatus = Int
pHttpStatus_
    }

-- | A list of the application versions and the associated configuration
-- summaries. The list includes application versions that were rolled back.
--
-- To get the complete description of a specific application version,
-- invoke the DescribeApplicationVersion operation.
listApplicationVersionsResponse_applicationVersionSummaries :: Lens.Lens' ListApplicationVersionsResponse (Prelude.Maybe [ApplicationVersionSummary])
listApplicationVersionsResponse_applicationVersionSummaries :: Lens'
  ListApplicationVersionsResponse (Maybe [ApplicationVersionSummary])
listApplicationVersionsResponse_applicationVersionSummaries = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListApplicationVersionsResponse' {Maybe [ApplicationVersionSummary]
applicationVersionSummaries :: Maybe [ApplicationVersionSummary]
$sel:applicationVersionSummaries:ListApplicationVersionsResponse' :: ListApplicationVersionsResponse
-> Maybe [ApplicationVersionSummary]
applicationVersionSummaries} -> Maybe [ApplicationVersionSummary]
applicationVersionSummaries) (\s :: ListApplicationVersionsResponse
s@ListApplicationVersionsResponse' {} Maybe [ApplicationVersionSummary]
a -> ListApplicationVersionsResponse
s {$sel:applicationVersionSummaries:ListApplicationVersionsResponse' :: Maybe [ApplicationVersionSummary]
applicationVersionSummaries = Maybe [ApplicationVersionSummary]
a} :: ListApplicationVersionsResponse) 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 pagination token for the next set of results, or @null@ if there are
-- no additional results. To retrieve the next set of items, pass this
-- token into a subsequent invocation of this operation. For more
-- information about pagination, see
-- <https://docs.aws.amazon.com/cli/latest/userguide/pagination.html Using the Amazon Command Line Interface\'s Pagination Options>.
listApplicationVersionsResponse_nextToken :: Lens.Lens' ListApplicationVersionsResponse (Prelude.Maybe Prelude.Text)
listApplicationVersionsResponse_nextToken :: Lens' ListApplicationVersionsResponse (Maybe Text)
listApplicationVersionsResponse_nextToken = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListApplicationVersionsResponse' {Maybe Text
nextToken :: Maybe Text
$sel:nextToken:ListApplicationVersionsResponse' :: ListApplicationVersionsResponse -> Maybe Text
nextToken} -> Maybe Text
nextToken) (\s :: ListApplicationVersionsResponse
s@ListApplicationVersionsResponse' {} Maybe Text
a -> ListApplicationVersionsResponse
s {$sel:nextToken:ListApplicationVersionsResponse' :: Maybe Text
nextToken = Maybe Text
a} :: ListApplicationVersionsResponse)

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

instance
  Prelude.NFData
    ListApplicationVersionsResponse
  where
  rnf :: ListApplicationVersionsResponse -> ()
rnf ListApplicationVersionsResponse' {Int
Maybe [ApplicationVersionSummary]
Maybe Text
httpStatus :: Int
nextToken :: Maybe Text
applicationVersionSummaries :: Maybe [ApplicationVersionSummary]
$sel:httpStatus:ListApplicationVersionsResponse' :: ListApplicationVersionsResponse -> Int
$sel:nextToken:ListApplicationVersionsResponse' :: ListApplicationVersionsResponse -> Maybe Text
$sel:applicationVersionSummaries:ListApplicationVersionsResponse' :: ListApplicationVersionsResponse
-> Maybe [ApplicationVersionSummary]
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe [ApplicationVersionSummary]
applicationVersionSummaries
      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 Int
httpStatus