{-# 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.Comprehend.ListEndpoints
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
--
-- Gets a list of all existing endpoints that you\'ve created. For
-- information about endpoints, see
-- <https://docs.aws.amazon.com/comprehend/latest/dg/manage-endpoints.html Managing endpoints>.
--
-- This operation returns paginated results.
module Amazonka.Comprehend.ListEndpoints
  ( -- * Creating a Request
    ListEndpoints (..),
    newListEndpoints,

    -- * Request Lenses
    listEndpoints_filter,
    listEndpoints_maxResults,
    listEndpoints_nextToken,

    -- * Destructuring the Response
    ListEndpointsResponse (..),
    newListEndpointsResponse,

    -- * Response Lenses
    listEndpointsResponse_endpointPropertiesList,
    listEndpointsResponse_nextToken,
    listEndpointsResponse_httpStatus,
  )
where

import Amazonka.Comprehend.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:/ 'newListEndpoints' smart constructor.
data ListEndpoints = ListEndpoints'
  { -- | Filters the endpoints that are returned. You can filter endpoints on
    -- their name, model, status, or the date and time that they were created.
    -- You can only set one filter at a time.
    ListEndpoints -> Maybe EndpointFilter
filter' :: Prelude.Maybe EndpointFilter,
    -- | The maximum number of results to return in each page. The default is
    -- 100.
    ListEndpoints -> Maybe Natural
maxResults :: Prelude.Maybe Prelude.Natural,
    -- | Identifies the next page of results to return.
    ListEndpoints -> Maybe Text
nextToken :: Prelude.Maybe Prelude.Text
  }
  deriving (ListEndpoints -> ListEndpoints -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: ListEndpoints -> ListEndpoints -> Bool
$c/= :: ListEndpoints -> ListEndpoints -> Bool
== :: ListEndpoints -> ListEndpoints -> Bool
$c== :: ListEndpoints -> ListEndpoints -> Bool
Prelude.Eq, ReadPrec [ListEndpoints]
ReadPrec ListEndpoints
Int -> ReadS ListEndpoints
ReadS [ListEndpoints]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [ListEndpoints]
$creadListPrec :: ReadPrec [ListEndpoints]
readPrec :: ReadPrec ListEndpoints
$creadPrec :: ReadPrec ListEndpoints
readList :: ReadS [ListEndpoints]
$creadList :: ReadS [ListEndpoints]
readsPrec :: Int -> ReadS ListEndpoints
$creadsPrec :: Int -> ReadS ListEndpoints
Prelude.Read, Int -> ListEndpoints -> ShowS
[ListEndpoints] -> ShowS
ListEndpoints -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [ListEndpoints] -> ShowS
$cshowList :: [ListEndpoints] -> ShowS
show :: ListEndpoints -> String
$cshow :: ListEndpoints -> String
showsPrec :: Int -> ListEndpoints -> ShowS
$cshowsPrec :: Int -> ListEndpoints -> ShowS
Prelude.Show, forall x. Rep ListEndpoints x -> ListEndpoints
forall x. ListEndpoints -> Rep ListEndpoints x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep ListEndpoints x -> ListEndpoints
$cfrom :: forall x. ListEndpoints -> Rep ListEndpoints x
Prelude.Generic)

-- |
-- Create a value of 'ListEndpoints' 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:
--
-- 'filter'', 'listEndpoints_filter' - Filters the endpoints that are returned. You can filter endpoints on
-- their name, model, status, or the date and time that they were created.
-- You can only set one filter at a time.
--
-- 'maxResults', 'listEndpoints_maxResults' - The maximum number of results to return in each page. The default is
-- 100.
--
-- 'nextToken', 'listEndpoints_nextToken' - Identifies the next page of results to return.
newListEndpoints ::
  ListEndpoints
newListEndpoints :: ListEndpoints
newListEndpoints =
  ListEndpoints'
    { $sel:filter':ListEndpoints' :: Maybe EndpointFilter
filter' = forall a. Maybe a
Prelude.Nothing,
      $sel:maxResults:ListEndpoints' :: Maybe Natural
maxResults = forall a. Maybe a
Prelude.Nothing,
      $sel:nextToken:ListEndpoints' :: Maybe Text
nextToken = forall a. Maybe a
Prelude.Nothing
    }

-- | Filters the endpoints that are returned. You can filter endpoints on
-- their name, model, status, or the date and time that they were created.
-- You can only set one filter at a time.
listEndpoints_filter :: Lens.Lens' ListEndpoints (Prelude.Maybe EndpointFilter)
listEndpoints_filter :: Lens' ListEndpoints (Maybe EndpointFilter)
listEndpoints_filter = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListEndpoints' {Maybe EndpointFilter
filter' :: Maybe EndpointFilter
$sel:filter':ListEndpoints' :: ListEndpoints -> Maybe EndpointFilter
filter'} -> Maybe EndpointFilter
filter') (\s :: ListEndpoints
s@ListEndpoints' {} Maybe EndpointFilter
a -> ListEndpoints
s {$sel:filter':ListEndpoints' :: Maybe EndpointFilter
filter' = Maybe EndpointFilter
a} :: ListEndpoints)

-- | The maximum number of results to return in each page. The default is
-- 100.
listEndpoints_maxResults :: Lens.Lens' ListEndpoints (Prelude.Maybe Prelude.Natural)
listEndpoints_maxResults :: Lens' ListEndpoints (Maybe Natural)
listEndpoints_maxResults = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListEndpoints' {Maybe Natural
maxResults :: Maybe Natural
$sel:maxResults:ListEndpoints' :: ListEndpoints -> Maybe Natural
maxResults} -> Maybe Natural
maxResults) (\s :: ListEndpoints
s@ListEndpoints' {} Maybe Natural
a -> ListEndpoints
s {$sel:maxResults:ListEndpoints' :: Maybe Natural
maxResults = Maybe Natural
a} :: ListEndpoints)

-- | Identifies the next page of results to return.
listEndpoints_nextToken :: Lens.Lens' ListEndpoints (Prelude.Maybe Prelude.Text)
listEndpoints_nextToken :: Lens' ListEndpoints (Maybe Text)
listEndpoints_nextToken = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListEndpoints' {Maybe Text
nextToken :: Maybe Text
$sel:nextToken:ListEndpoints' :: ListEndpoints -> Maybe Text
nextToken} -> Maybe Text
nextToken) (\s :: ListEndpoints
s@ListEndpoints' {} Maybe Text
a -> ListEndpoints
s {$sel:nextToken:ListEndpoints' :: Maybe Text
nextToken = Maybe Text
a} :: ListEndpoints)

instance Core.AWSPager ListEndpoints where
  page :: ListEndpoints -> AWSResponse ListEndpoints -> Maybe ListEndpoints
page ListEndpoints
rq AWSResponse ListEndpoints
rs
    | forall a. AWSTruncated a => a -> Bool
Core.stop
        ( AWSResponse ListEndpoints
rs
            forall s a. s -> Getting (First a) s a -> Maybe a
Lens.^? Lens' ListEndpointsResponse (Maybe Text)
listEndpointsResponse_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 ListEndpoints
rs
            forall s a. s -> Getting (First a) s a -> Maybe a
Lens.^? Lens' ListEndpointsResponse (Maybe [EndpointProperties])
listEndpointsResponse_endpointPropertiesList
            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.$ ListEndpoints
rq
          forall a b. a -> (a -> b) -> b
Prelude.& Lens' ListEndpoints (Maybe Text)
listEndpoints_nextToken
          forall s t a b. ASetter s t a b -> b -> s -> t
Lens..~ AWSResponse ListEndpoints
rs
          forall s a. s -> Getting (First a) s a -> Maybe a
Lens.^? Lens' ListEndpointsResponse (Maybe Text)
listEndpointsResponse_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 ListEndpoints where
  type
    AWSResponse ListEndpoints =
      ListEndpointsResponse
  request :: (Service -> Service) -> ListEndpoints -> Request ListEndpoints
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 ListEndpoints
-> ClientResponse ClientBody
-> m (Either Error (ClientResponse (AWSResponse ListEndpoints)))
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 [EndpointProperties]
-> Maybe Text -> Int -> ListEndpointsResponse
ListEndpointsResponse'
            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
"EndpointPropertiesList"
                            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 ListEndpoints where
  hashWithSalt :: Int -> ListEndpoints -> Int
hashWithSalt Int
_salt ListEndpoints' {Maybe Natural
Maybe Text
Maybe EndpointFilter
nextToken :: Maybe Text
maxResults :: Maybe Natural
filter' :: Maybe EndpointFilter
$sel:nextToken:ListEndpoints' :: ListEndpoints -> Maybe Text
$sel:maxResults:ListEndpoints' :: ListEndpoints -> Maybe Natural
$sel:filter':ListEndpoints' :: ListEndpoints -> Maybe EndpointFilter
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe EndpointFilter
filter'
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Natural
maxResults
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
nextToken

instance Prelude.NFData ListEndpoints where
  rnf :: ListEndpoints -> ()
rnf ListEndpoints' {Maybe Natural
Maybe Text
Maybe EndpointFilter
nextToken :: Maybe Text
maxResults :: Maybe Natural
filter' :: Maybe EndpointFilter
$sel:nextToken:ListEndpoints' :: ListEndpoints -> Maybe Text
$sel:maxResults:ListEndpoints' :: ListEndpoints -> Maybe Natural
$sel:filter':ListEndpoints' :: ListEndpoints -> Maybe EndpointFilter
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe EndpointFilter
filter'
      seq :: forall a b. a -> b -> b
`Prelude.seq` 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

instance Data.ToHeaders ListEndpoints where
  toHeaders :: ListEndpoints -> 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
"Comprehend_20171127.ListEndpoints" ::
                          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 ListEndpoints where
  toJSON :: ListEndpoints -> Value
toJSON ListEndpoints' {Maybe Natural
Maybe Text
Maybe EndpointFilter
nextToken :: Maybe Text
maxResults :: Maybe Natural
filter' :: Maybe EndpointFilter
$sel:nextToken:ListEndpoints' :: ListEndpoints -> Maybe Text
$sel:maxResults:ListEndpoints' :: ListEndpoints -> Maybe Natural
$sel:filter':ListEndpoints' :: ListEndpoints -> Maybe EndpointFilter
..} =
    [Pair] -> Value
Data.object
      ( forall a. [Maybe a] -> [a]
Prelude.catMaybes
          [ (Key
"Filter" 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 EndpointFilter
filter',
            (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
          ]
      )

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

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

-- | /See:/ 'newListEndpointsResponse' smart constructor.
data ListEndpointsResponse = ListEndpointsResponse'
  { -- | Displays a list of endpoint properties being retrieved by the service in
    -- response to the request.
    ListEndpointsResponse -> Maybe [EndpointProperties]
endpointPropertiesList :: Prelude.Maybe [EndpointProperties],
    -- | Identifies the next page of results to return.
    ListEndpointsResponse -> Maybe Text
nextToken :: Prelude.Maybe Prelude.Text,
    -- | The response's http status code.
    ListEndpointsResponse -> Int
httpStatus :: Prelude.Int
  }
  deriving (ListEndpointsResponse -> ListEndpointsResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: ListEndpointsResponse -> ListEndpointsResponse -> Bool
$c/= :: ListEndpointsResponse -> ListEndpointsResponse -> Bool
== :: ListEndpointsResponse -> ListEndpointsResponse -> Bool
$c== :: ListEndpointsResponse -> ListEndpointsResponse -> Bool
Prelude.Eq, ReadPrec [ListEndpointsResponse]
ReadPrec ListEndpointsResponse
Int -> ReadS ListEndpointsResponse
ReadS [ListEndpointsResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [ListEndpointsResponse]
$creadListPrec :: ReadPrec [ListEndpointsResponse]
readPrec :: ReadPrec ListEndpointsResponse
$creadPrec :: ReadPrec ListEndpointsResponse
readList :: ReadS [ListEndpointsResponse]
$creadList :: ReadS [ListEndpointsResponse]
readsPrec :: Int -> ReadS ListEndpointsResponse
$creadsPrec :: Int -> ReadS ListEndpointsResponse
Prelude.Read, Int -> ListEndpointsResponse -> ShowS
[ListEndpointsResponse] -> ShowS
ListEndpointsResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [ListEndpointsResponse] -> ShowS
$cshowList :: [ListEndpointsResponse] -> ShowS
show :: ListEndpointsResponse -> String
$cshow :: ListEndpointsResponse -> String
showsPrec :: Int -> ListEndpointsResponse -> ShowS
$cshowsPrec :: Int -> ListEndpointsResponse -> ShowS
Prelude.Show, forall x. Rep ListEndpointsResponse x -> ListEndpointsResponse
forall x. ListEndpointsResponse -> Rep ListEndpointsResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep ListEndpointsResponse x -> ListEndpointsResponse
$cfrom :: forall x. ListEndpointsResponse -> Rep ListEndpointsResponse x
Prelude.Generic)

-- |
-- Create a value of 'ListEndpointsResponse' 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:
--
-- 'endpointPropertiesList', 'listEndpointsResponse_endpointPropertiesList' - Displays a list of endpoint properties being retrieved by the service in
-- response to the request.
--
-- 'nextToken', 'listEndpointsResponse_nextToken' - Identifies the next page of results to return.
--
-- 'httpStatus', 'listEndpointsResponse_httpStatus' - The response's http status code.
newListEndpointsResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  ListEndpointsResponse
newListEndpointsResponse :: Int -> ListEndpointsResponse
newListEndpointsResponse Int
pHttpStatus_ =
  ListEndpointsResponse'
    { $sel:endpointPropertiesList:ListEndpointsResponse' :: Maybe [EndpointProperties]
endpointPropertiesList =
        forall a. Maybe a
Prelude.Nothing,
      $sel:nextToken:ListEndpointsResponse' :: Maybe Text
nextToken = forall a. Maybe a
Prelude.Nothing,
      $sel:httpStatus:ListEndpointsResponse' :: Int
httpStatus = Int
pHttpStatus_
    }

-- | Displays a list of endpoint properties being retrieved by the service in
-- response to the request.
listEndpointsResponse_endpointPropertiesList :: Lens.Lens' ListEndpointsResponse (Prelude.Maybe [EndpointProperties])
listEndpointsResponse_endpointPropertiesList :: Lens' ListEndpointsResponse (Maybe [EndpointProperties])
listEndpointsResponse_endpointPropertiesList = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListEndpointsResponse' {Maybe [EndpointProperties]
endpointPropertiesList :: Maybe [EndpointProperties]
$sel:endpointPropertiesList:ListEndpointsResponse' :: ListEndpointsResponse -> Maybe [EndpointProperties]
endpointPropertiesList} -> Maybe [EndpointProperties]
endpointPropertiesList) (\s :: ListEndpointsResponse
s@ListEndpointsResponse' {} Maybe [EndpointProperties]
a -> ListEndpointsResponse
s {$sel:endpointPropertiesList:ListEndpointsResponse' :: Maybe [EndpointProperties]
endpointPropertiesList = Maybe [EndpointProperties]
a} :: ListEndpointsResponse) 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

-- | Identifies the next page of results to return.
listEndpointsResponse_nextToken :: Lens.Lens' ListEndpointsResponse (Prelude.Maybe Prelude.Text)
listEndpointsResponse_nextToken :: Lens' ListEndpointsResponse (Maybe Text)
listEndpointsResponse_nextToken = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListEndpointsResponse' {Maybe Text
nextToken :: Maybe Text
$sel:nextToken:ListEndpointsResponse' :: ListEndpointsResponse -> Maybe Text
nextToken} -> Maybe Text
nextToken) (\s :: ListEndpointsResponse
s@ListEndpointsResponse' {} Maybe Text
a -> ListEndpointsResponse
s {$sel:nextToken:ListEndpointsResponse' :: Maybe Text
nextToken = Maybe Text
a} :: ListEndpointsResponse)

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

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