{-# 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.OpenSearch.ListPackagesForDomain
-- 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 packages associated with an Amazon OpenSearch Service domain.
-- For more information, see
-- <https://docs.aws.amazon.com/opensearch-service/latest/developerguide/custom-packages.html Custom packages for Amazon OpenSearch Service>.
module Amazonka.OpenSearch.ListPackagesForDomain
  ( -- * Creating a Request
    ListPackagesForDomain (..),
    newListPackagesForDomain,

    -- * Request Lenses
    listPackagesForDomain_maxResults,
    listPackagesForDomain_nextToken,
    listPackagesForDomain_domainName,

    -- * Destructuring the Response
    ListPackagesForDomainResponse (..),
    newListPackagesForDomainResponse,

    -- * Response Lenses
    listPackagesForDomainResponse_domainPackageDetailsList,
    listPackagesForDomainResponse_nextToken,
    listPackagesForDomainResponse_httpStatus,
  )
where

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

-- | Container for the request parameters to the @ListPackagesForDomain@
-- operation.
--
-- /See:/ 'newListPackagesForDomain' smart constructor.
data ListPackagesForDomain = ListPackagesForDomain'
  { -- | An optional parameter that specifies the maximum number of results to
    -- return. You can use @nextToken@ to get the next page of results.
    ListPackagesForDomain -> Maybe Int
maxResults :: Prelude.Maybe Prelude.Int,
    -- | If your initial @ListPackagesForDomain@ operation returns a @nextToken@,
    -- you can include the returned @nextToken@ in subsequent
    -- @ListPackagesForDomain@ operations, which returns results in the next
    -- page.
    ListPackagesForDomain -> Maybe Text
nextToken :: Prelude.Maybe Prelude.Text,
    -- | The name of the domain for which you want to list associated packages.
    ListPackagesForDomain -> Text
domainName :: Prelude.Text
  }
  deriving (ListPackagesForDomain -> ListPackagesForDomain -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: ListPackagesForDomain -> ListPackagesForDomain -> Bool
$c/= :: ListPackagesForDomain -> ListPackagesForDomain -> Bool
== :: ListPackagesForDomain -> ListPackagesForDomain -> Bool
$c== :: ListPackagesForDomain -> ListPackagesForDomain -> Bool
Prelude.Eq, ReadPrec [ListPackagesForDomain]
ReadPrec ListPackagesForDomain
Int -> ReadS ListPackagesForDomain
ReadS [ListPackagesForDomain]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [ListPackagesForDomain]
$creadListPrec :: ReadPrec [ListPackagesForDomain]
readPrec :: ReadPrec ListPackagesForDomain
$creadPrec :: ReadPrec ListPackagesForDomain
readList :: ReadS [ListPackagesForDomain]
$creadList :: ReadS [ListPackagesForDomain]
readsPrec :: Int -> ReadS ListPackagesForDomain
$creadsPrec :: Int -> ReadS ListPackagesForDomain
Prelude.Read, Int -> ListPackagesForDomain -> ShowS
[ListPackagesForDomain] -> ShowS
ListPackagesForDomain -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [ListPackagesForDomain] -> ShowS
$cshowList :: [ListPackagesForDomain] -> ShowS
show :: ListPackagesForDomain -> String
$cshow :: ListPackagesForDomain -> String
showsPrec :: Int -> ListPackagesForDomain -> ShowS
$cshowsPrec :: Int -> ListPackagesForDomain -> ShowS
Prelude.Show, forall x. Rep ListPackagesForDomain x -> ListPackagesForDomain
forall x. ListPackagesForDomain -> Rep ListPackagesForDomain x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep ListPackagesForDomain x -> ListPackagesForDomain
$cfrom :: forall x. ListPackagesForDomain -> Rep ListPackagesForDomain x
Prelude.Generic)

-- |
-- Create a value of 'ListPackagesForDomain' 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', 'listPackagesForDomain_maxResults' - An optional parameter that specifies the maximum number of results to
-- return. You can use @nextToken@ to get the next page of results.
--
-- 'nextToken', 'listPackagesForDomain_nextToken' - If your initial @ListPackagesForDomain@ operation returns a @nextToken@,
-- you can include the returned @nextToken@ in subsequent
-- @ListPackagesForDomain@ operations, which returns results in the next
-- page.
--
-- 'domainName', 'listPackagesForDomain_domainName' - The name of the domain for which you want to list associated packages.
newListPackagesForDomain ::
  -- | 'domainName'
  Prelude.Text ->
  ListPackagesForDomain
newListPackagesForDomain :: Text -> ListPackagesForDomain
newListPackagesForDomain Text
pDomainName_ =
  ListPackagesForDomain'
    { $sel:maxResults:ListPackagesForDomain' :: Maybe Int
maxResults =
        forall a. Maybe a
Prelude.Nothing,
      $sel:nextToken:ListPackagesForDomain' :: Maybe Text
nextToken = forall a. Maybe a
Prelude.Nothing,
      $sel:domainName:ListPackagesForDomain' :: Text
domainName = Text
pDomainName_
    }

-- | An optional parameter that specifies the maximum number of results to
-- return. You can use @nextToken@ to get the next page of results.
listPackagesForDomain_maxResults :: Lens.Lens' ListPackagesForDomain (Prelude.Maybe Prelude.Int)
listPackagesForDomain_maxResults :: Lens' ListPackagesForDomain (Maybe Int)
listPackagesForDomain_maxResults = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListPackagesForDomain' {Maybe Int
maxResults :: Maybe Int
$sel:maxResults:ListPackagesForDomain' :: ListPackagesForDomain -> Maybe Int
maxResults} -> Maybe Int
maxResults) (\s :: ListPackagesForDomain
s@ListPackagesForDomain' {} Maybe Int
a -> ListPackagesForDomain
s {$sel:maxResults:ListPackagesForDomain' :: Maybe Int
maxResults = Maybe Int
a} :: ListPackagesForDomain)

-- | If your initial @ListPackagesForDomain@ operation returns a @nextToken@,
-- you can include the returned @nextToken@ in subsequent
-- @ListPackagesForDomain@ operations, which returns results in the next
-- page.
listPackagesForDomain_nextToken :: Lens.Lens' ListPackagesForDomain (Prelude.Maybe Prelude.Text)
listPackagesForDomain_nextToken :: Lens' ListPackagesForDomain (Maybe Text)
listPackagesForDomain_nextToken = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListPackagesForDomain' {Maybe Text
nextToken :: Maybe Text
$sel:nextToken:ListPackagesForDomain' :: ListPackagesForDomain -> Maybe Text
nextToken} -> Maybe Text
nextToken) (\s :: ListPackagesForDomain
s@ListPackagesForDomain' {} Maybe Text
a -> ListPackagesForDomain
s {$sel:nextToken:ListPackagesForDomain' :: Maybe Text
nextToken = Maybe Text
a} :: ListPackagesForDomain)

-- | The name of the domain for which you want to list associated packages.
listPackagesForDomain_domainName :: Lens.Lens' ListPackagesForDomain Prelude.Text
listPackagesForDomain_domainName :: Lens' ListPackagesForDomain Text
listPackagesForDomain_domainName = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListPackagesForDomain' {Text
domainName :: Text
$sel:domainName:ListPackagesForDomain' :: ListPackagesForDomain -> Text
domainName} -> Text
domainName) (\s :: ListPackagesForDomain
s@ListPackagesForDomain' {} Text
a -> ListPackagesForDomain
s {$sel:domainName:ListPackagesForDomain' :: Text
domainName = Text
a} :: ListPackagesForDomain)

instance Core.AWSRequest ListPackagesForDomain where
  type
    AWSResponse ListPackagesForDomain =
      ListPackagesForDomainResponse
  request :: (Service -> Service)
-> ListPackagesForDomain -> Request ListPackagesForDomain
request Service -> Service
overrides =
    forall a. ToRequest a => Service -> a -> Request a
Request.get (Service -> Service
overrides Service
defaultService)
  response :: forall (m :: * -> *).
MonadResource m =>
(ByteStringLazy -> IO ByteStringLazy)
-> Service
-> Proxy ListPackagesForDomain
-> ClientResponse ClientBody
-> m (Either
        Error (ClientResponse (AWSResponse ListPackagesForDomain)))
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 [DomainPackageDetails]
-> Maybe Text -> Int -> ListPackagesForDomainResponse
ListPackagesForDomainResponse'
            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
"DomainPackageDetailsList"
                            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 ListPackagesForDomain where
  hashWithSalt :: Int -> ListPackagesForDomain -> Int
hashWithSalt Int
_salt ListPackagesForDomain' {Maybe Int
Maybe Text
Text
domainName :: Text
nextToken :: Maybe Text
maxResults :: Maybe Int
$sel:domainName:ListPackagesForDomain' :: ListPackagesForDomain -> Text
$sel:nextToken:ListPackagesForDomain' :: ListPackagesForDomain -> Maybe Text
$sel:maxResults:ListPackagesForDomain' :: ListPackagesForDomain -> Maybe Int
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Int
maxResults
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
nextToken
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
domainName

instance Prelude.NFData ListPackagesForDomain where
  rnf :: ListPackagesForDomain -> ()
rnf ListPackagesForDomain' {Maybe Int
Maybe Text
Text
domainName :: Text
nextToken :: Maybe Text
maxResults :: Maybe Int
$sel:domainName:ListPackagesForDomain' :: ListPackagesForDomain -> Text
$sel:nextToken:ListPackagesForDomain' :: ListPackagesForDomain -> Maybe Text
$sel:maxResults:ListPackagesForDomain' :: ListPackagesForDomain -> Maybe Int
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Int
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 Text
domainName

instance Data.ToHeaders ListPackagesForDomain where
  toHeaders :: ListPackagesForDomain -> ResponseHeaders
toHeaders = forall a b. a -> b -> a
Prelude.const forall a. Monoid a => a
Prelude.mempty

instance Data.ToPath ListPackagesForDomain where
  toPath :: ListPackagesForDomain -> ByteString
toPath ListPackagesForDomain' {Maybe Int
Maybe Text
Text
domainName :: Text
nextToken :: Maybe Text
maxResults :: Maybe Int
$sel:domainName:ListPackagesForDomain' :: ListPackagesForDomain -> Text
$sel:nextToken:ListPackagesForDomain' :: ListPackagesForDomain -> Maybe Text
$sel:maxResults:ListPackagesForDomain' :: ListPackagesForDomain -> Maybe Int
..} =
    forall a. Monoid a => [a] -> a
Prelude.mconcat
      [ ByteString
"/2021-01-01/domain/",
        forall a. ToByteString a => a -> ByteString
Data.toBS Text
domainName,
        ByteString
"/packages"
      ]

instance Data.ToQuery ListPackagesForDomain where
  toQuery :: ListPackagesForDomain -> QueryString
toQuery ListPackagesForDomain' {Maybe Int
Maybe Text
Text
domainName :: Text
nextToken :: Maybe Text
maxResults :: Maybe Int
$sel:domainName:ListPackagesForDomain' :: ListPackagesForDomain -> Text
$sel:nextToken:ListPackagesForDomain' :: ListPackagesForDomain -> Maybe Text
$sel:maxResults:ListPackagesForDomain' :: ListPackagesForDomain -> Maybe Int
..} =
    forall a. Monoid a => [a] -> a
Prelude.mconcat
      [ ByteString
"maxResults" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Int
maxResults,
        ByteString
"nextToken" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Text
nextToken
      ]

-- | Container for the response parameters to the @ListPackagesForDomain@
-- operation.
--
-- /See:/ 'newListPackagesForDomainResponse' smart constructor.
data ListPackagesForDomainResponse = ListPackagesForDomainResponse'
  { -- | List of all packages associated with a domain.
    ListPackagesForDomainResponse -> Maybe [DomainPackageDetails]
domainPackageDetailsList :: Prelude.Maybe [DomainPackageDetails],
    -- | When @nextToken@ is returned, there are more results available. The
    -- value of @nextToken@ is a unique pagination token for each page. Make
    -- the call again using the returned token to retrieve the next page.
    ListPackagesForDomainResponse -> Maybe Text
nextToken :: Prelude.Maybe Prelude.Text,
    -- | The response's http status code.
    ListPackagesForDomainResponse -> Int
httpStatus :: Prelude.Int
  }
  deriving (ListPackagesForDomainResponse
-> ListPackagesForDomainResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: ListPackagesForDomainResponse
-> ListPackagesForDomainResponse -> Bool
$c/= :: ListPackagesForDomainResponse
-> ListPackagesForDomainResponse -> Bool
== :: ListPackagesForDomainResponse
-> ListPackagesForDomainResponse -> Bool
$c== :: ListPackagesForDomainResponse
-> ListPackagesForDomainResponse -> Bool
Prelude.Eq, ReadPrec [ListPackagesForDomainResponse]
ReadPrec ListPackagesForDomainResponse
Int -> ReadS ListPackagesForDomainResponse
ReadS [ListPackagesForDomainResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [ListPackagesForDomainResponse]
$creadListPrec :: ReadPrec [ListPackagesForDomainResponse]
readPrec :: ReadPrec ListPackagesForDomainResponse
$creadPrec :: ReadPrec ListPackagesForDomainResponse
readList :: ReadS [ListPackagesForDomainResponse]
$creadList :: ReadS [ListPackagesForDomainResponse]
readsPrec :: Int -> ReadS ListPackagesForDomainResponse
$creadsPrec :: Int -> ReadS ListPackagesForDomainResponse
Prelude.Read, Int -> ListPackagesForDomainResponse -> ShowS
[ListPackagesForDomainResponse] -> ShowS
ListPackagesForDomainResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [ListPackagesForDomainResponse] -> ShowS
$cshowList :: [ListPackagesForDomainResponse] -> ShowS
show :: ListPackagesForDomainResponse -> String
$cshow :: ListPackagesForDomainResponse -> String
showsPrec :: Int -> ListPackagesForDomainResponse -> ShowS
$cshowsPrec :: Int -> ListPackagesForDomainResponse -> ShowS
Prelude.Show, forall x.
Rep ListPackagesForDomainResponse x
-> ListPackagesForDomainResponse
forall x.
ListPackagesForDomainResponse
-> Rep ListPackagesForDomainResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep ListPackagesForDomainResponse x
-> ListPackagesForDomainResponse
$cfrom :: forall x.
ListPackagesForDomainResponse
-> Rep ListPackagesForDomainResponse x
Prelude.Generic)

-- |
-- Create a value of 'ListPackagesForDomainResponse' 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:
--
-- 'domainPackageDetailsList', 'listPackagesForDomainResponse_domainPackageDetailsList' - List of all packages associated with a domain.
--
-- 'nextToken', 'listPackagesForDomainResponse_nextToken' - When @nextToken@ is returned, there are more results available. The
-- value of @nextToken@ is a unique pagination token for each page. Make
-- the call again using the returned token to retrieve the next page.
--
-- 'httpStatus', 'listPackagesForDomainResponse_httpStatus' - The response's http status code.
newListPackagesForDomainResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  ListPackagesForDomainResponse
newListPackagesForDomainResponse :: Int -> ListPackagesForDomainResponse
newListPackagesForDomainResponse Int
pHttpStatus_ =
  ListPackagesForDomainResponse'
    { $sel:domainPackageDetailsList:ListPackagesForDomainResponse' :: Maybe [DomainPackageDetails]
domainPackageDetailsList =
        forall a. Maybe a
Prelude.Nothing,
      $sel:nextToken:ListPackagesForDomainResponse' :: Maybe Text
nextToken = forall a. Maybe a
Prelude.Nothing,
      $sel:httpStatus:ListPackagesForDomainResponse' :: Int
httpStatus = Int
pHttpStatus_
    }

-- | List of all packages associated with a domain.
listPackagesForDomainResponse_domainPackageDetailsList :: Lens.Lens' ListPackagesForDomainResponse (Prelude.Maybe [DomainPackageDetails])
listPackagesForDomainResponse_domainPackageDetailsList :: Lens' ListPackagesForDomainResponse (Maybe [DomainPackageDetails])
listPackagesForDomainResponse_domainPackageDetailsList = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListPackagesForDomainResponse' {Maybe [DomainPackageDetails]
domainPackageDetailsList :: Maybe [DomainPackageDetails]
$sel:domainPackageDetailsList:ListPackagesForDomainResponse' :: ListPackagesForDomainResponse -> Maybe [DomainPackageDetails]
domainPackageDetailsList} -> Maybe [DomainPackageDetails]
domainPackageDetailsList) (\s :: ListPackagesForDomainResponse
s@ListPackagesForDomainResponse' {} Maybe [DomainPackageDetails]
a -> ListPackagesForDomainResponse
s {$sel:domainPackageDetailsList:ListPackagesForDomainResponse' :: Maybe [DomainPackageDetails]
domainPackageDetailsList = Maybe [DomainPackageDetails]
a} :: ListPackagesForDomainResponse) 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

-- | When @nextToken@ is returned, there are more results available. The
-- value of @nextToken@ is a unique pagination token for each page. Make
-- the call again using the returned token to retrieve the next page.
listPackagesForDomainResponse_nextToken :: Lens.Lens' ListPackagesForDomainResponse (Prelude.Maybe Prelude.Text)
listPackagesForDomainResponse_nextToken :: Lens' ListPackagesForDomainResponse (Maybe Text)
listPackagesForDomainResponse_nextToken = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListPackagesForDomainResponse' {Maybe Text
nextToken :: Maybe Text
$sel:nextToken:ListPackagesForDomainResponse' :: ListPackagesForDomainResponse -> Maybe Text
nextToken} -> Maybe Text
nextToken) (\s :: ListPackagesForDomainResponse
s@ListPackagesForDomainResponse' {} Maybe Text
a -> ListPackagesForDomainResponse
s {$sel:nextToken:ListPackagesForDomainResponse' :: Maybe Text
nextToken = Maybe Text
a} :: ListPackagesForDomainResponse)

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

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