{-# 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.DMS.DescribeEndpoints
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
--
-- Returns information about the endpoints for your account in the current
-- region.
--
-- This operation returns paginated results.
module Amazonka.DMS.DescribeEndpoints
  ( -- * Creating a Request
    DescribeEndpoints (..),
    newDescribeEndpoints,

    -- * Request Lenses
    describeEndpoints_filters,
    describeEndpoints_marker,
    describeEndpoints_maxRecords,

    -- * Destructuring the Response
    DescribeEndpointsResponse (..),
    newDescribeEndpointsResponse,

    -- * Response Lenses
    describeEndpointsResponse_endpoints,
    describeEndpointsResponse_marker,
    describeEndpointsResponse_httpStatus,
  )
where

import qualified Amazonka.Core as Core
import qualified Amazonka.Core.Lens.Internal as Lens
import Amazonka.DMS.Types
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:/ 'newDescribeEndpoints' smart constructor.
data DescribeEndpoints = DescribeEndpoints'
  { -- | Filters applied to the endpoints.
    --
    -- Valid filter names: endpoint-arn | endpoint-type | endpoint-id |
    -- engine-name
    DescribeEndpoints -> Maybe [Filter]
filters :: Prelude.Maybe [Filter],
    -- | An optional pagination token provided by a previous request. If this
    -- parameter is specified, the response includes only records beyond the
    -- marker, up to the value specified by @MaxRecords@.
    DescribeEndpoints -> Maybe Text
marker :: Prelude.Maybe Prelude.Text,
    -- | The maximum number of records to include in the response. If more
    -- records exist than the specified @MaxRecords@ value, a pagination token
    -- called a marker is included in the response so that the remaining
    -- results can be retrieved.
    --
    -- Default: 100
    --
    -- Constraints: Minimum 20, maximum 100.
    DescribeEndpoints -> Maybe Int
maxRecords :: Prelude.Maybe Prelude.Int
  }
  deriving (DescribeEndpoints -> DescribeEndpoints -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DescribeEndpoints -> DescribeEndpoints -> Bool
$c/= :: DescribeEndpoints -> DescribeEndpoints -> Bool
== :: DescribeEndpoints -> DescribeEndpoints -> Bool
$c== :: DescribeEndpoints -> DescribeEndpoints -> Bool
Prelude.Eq, ReadPrec [DescribeEndpoints]
ReadPrec DescribeEndpoints
Int -> ReadS DescribeEndpoints
ReadS [DescribeEndpoints]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [DescribeEndpoints]
$creadListPrec :: ReadPrec [DescribeEndpoints]
readPrec :: ReadPrec DescribeEndpoints
$creadPrec :: ReadPrec DescribeEndpoints
readList :: ReadS [DescribeEndpoints]
$creadList :: ReadS [DescribeEndpoints]
readsPrec :: Int -> ReadS DescribeEndpoints
$creadsPrec :: Int -> ReadS DescribeEndpoints
Prelude.Read, Int -> DescribeEndpoints -> ShowS
[DescribeEndpoints] -> ShowS
DescribeEndpoints -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DescribeEndpoints] -> ShowS
$cshowList :: [DescribeEndpoints] -> ShowS
show :: DescribeEndpoints -> String
$cshow :: DescribeEndpoints -> String
showsPrec :: Int -> DescribeEndpoints -> ShowS
$cshowsPrec :: Int -> DescribeEndpoints -> ShowS
Prelude.Show, forall x. Rep DescribeEndpoints x -> DescribeEndpoints
forall x. DescribeEndpoints -> Rep DescribeEndpoints x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep DescribeEndpoints x -> DescribeEndpoints
$cfrom :: forall x. DescribeEndpoints -> Rep DescribeEndpoints x
Prelude.Generic)

-- |
-- Create a value of 'DescribeEndpoints' 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:
--
-- 'filters', 'describeEndpoints_filters' - Filters applied to the endpoints.
--
-- Valid filter names: endpoint-arn | endpoint-type | endpoint-id |
-- engine-name
--
-- 'marker', 'describeEndpoints_marker' - An optional pagination token provided by a previous request. If this
-- parameter is specified, the response includes only records beyond the
-- marker, up to the value specified by @MaxRecords@.
--
-- 'maxRecords', 'describeEndpoints_maxRecords' - The maximum number of records to include in the response. If more
-- records exist than the specified @MaxRecords@ value, a pagination token
-- called a marker is included in the response so that the remaining
-- results can be retrieved.
--
-- Default: 100
--
-- Constraints: Minimum 20, maximum 100.
newDescribeEndpoints ::
  DescribeEndpoints
newDescribeEndpoints :: DescribeEndpoints
newDescribeEndpoints =
  DescribeEndpoints'
    { $sel:filters:DescribeEndpoints' :: Maybe [Filter]
filters = forall a. Maybe a
Prelude.Nothing,
      $sel:marker:DescribeEndpoints' :: Maybe Text
marker = forall a. Maybe a
Prelude.Nothing,
      $sel:maxRecords:DescribeEndpoints' :: Maybe Int
maxRecords = forall a. Maybe a
Prelude.Nothing
    }

-- | Filters applied to the endpoints.
--
-- Valid filter names: endpoint-arn | endpoint-type | endpoint-id |
-- engine-name
describeEndpoints_filters :: Lens.Lens' DescribeEndpoints (Prelude.Maybe [Filter])
describeEndpoints_filters :: Lens' DescribeEndpoints (Maybe [Filter])
describeEndpoints_filters = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeEndpoints' {Maybe [Filter]
filters :: Maybe [Filter]
$sel:filters:DescribeEndpoints' :: DescribeEndpoints -> Maybe [Filter]
filters} -> Maybe [Filter]
filters) (\s :: DescribeEndpoints
s@DescribeEndpoints' {} Maybe [Filter]
a -> DescribeEndpoints
s {$sel:filters:DescribeEndpoints' :: Maybe [Filter]
filters = Maybe [Filter]
a} :: DescribeEndpoints) 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

-- | An optional pagination token provided by a previous request. If this
-- parameter is specified, the response includes only records beyond the
-- marker, up to the value specified by @MaxRecords@.
describeEndpoints_marker :: Lens.Lens' DescribeEndpoints (Prelude.Maybe Prelude.Text)
describeEndpoints_marker :: Lens' DescribeEndpoints (Maybe Text)
describeEndpoints_marker = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeEndpoints' {Maybe Text
marker :: Maybe Text
$sel:marker:DescribeEndpoints' :: DescribeEndpoints -> Maybe Text
marker} -> Maybe Text
marker) (\s :: DescribeEndpoints
s@DescribeEndpoints' {} Maybe Text
a -> DescribeEndpoints
s {$sel:marker:DescribeEndpoints' :: Maybe Text
marker = Maybe Text
a} :: DescribeEndpoints)

-- | The maximum number of records to include in the response. If more
-- records exist than the specified @MaxRecords@ value, a pagination token
-- called a marker is included in the response so that the remaining
-- results can be retrieved.
--
-- Default: 100
--
-- Constraints: Minimum 20, maximum 100.
describeEndpoints_maxRecords :: Lens.Lens' DescribeEndpoints (Prelude.Maybe Prelude.Int)
describeEndpoints_maxRecords :: Lens' DescribeEndpoints (Maybe Int)
describeEndpoints_maxRecords = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeEndpoints' {Maybe Int
maxRecords :: Maybe Int
$sel:maxRecords:DescribeEndpoints' :: DescribeEndpoints -> Maybe Int
maxRecords} -> Maybe Int
maxRecords) (\s :: DescribeEndpoints
s@DescribeEndpoints' {} Maybe Int
a -> DescribeEndpoints
s {$sel:maxRecords:DescribeEndpoints' :: Maybe Int
maxRecords = Maybe Int
a} :: DescribeEndpoints)

instance Core.AWSPager DescribeEndpoints where
  page :: DescribeEndpoints
-> AWSResponse DescribeEndpoints -> Maybe DescribeEndpoints
page DescribeEndpoints
rq AWSResponse DescribeEndpoints
rs
    | forall a. AWSTruncated a => a -> Bool
Core.stop
        ( AWSResponse DescribeEndpoints
rs
            forall s a. s -> Getting (First a) s a -> Maybe a
Lens.^? Lens' DescribeEndpointsResponse (Maybe Text)
describeEndpointsResponse_marker
            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 DescribeEndpoints
rs
            forall s a. s -> Getting (First a) s a -> Maybe a
Lens.^? Lens' DescribeEndpointsResponse (Maybe [Endpoint])
describeEndpointsResponse_endpoints
            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.$ DescribeEndpoints
rq
          forall a b. a -> (a -> b) -> b
Prelude.& Lens' DescribeEndpoints (Maybe Text)
describeEndpoints_marker
          forall s t a b. ASetter s t a b -> b -> s -> t
Lens..~ AWSResponse DescribeEndpoints
rs
          forall s a. s -> Getting (First a) s a -> Maybe a
Lens.^? Lens' DescribeEndpointsResponse (Maybe Text)
describeEndpointsResponse_marker
          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 DescribeEndpoints where
  type
    AWSResponse DescribeEndpoints =
      DescribeEndpointsResponse
  request :: (Service -> Service)
-> DescribeEndpoints -> Request DescribeEndpoints
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 DescribeEndpoints
-> ClientResponse ClientBody
-> m (Either
        Error (ClientResponse (AWSResponse DescribeEndpoints)))
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 [Endpoint] -> Maybe Text -> Int -> DescribeEndpointsResponse
DescribeEndpointsResponse'
            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
"Endpoints" 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
"Marker")
            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 DescribeEndpoints where
  hashWithSalt :: Int -> DescribeEndpoints -> Int
hashWithSalt Int
_salt DescribeEndpoints' {Maybe Int
Maybe [Filter]
Maybe Text
maxRecords :: Maybe Int
marker :: Maybe Text
filters :: Maybe [Filter]
$sel:maxRecords:DescribeEndpoints' :: DescribeEndpoints -> Maybe Int
$sel:marker:DescribeEndpoints' :: DescribeEndpoints -> Maybe Text
$sel:filters:DescribeEndpoints' :: DescribeEndpoints -> Maybe [Filter]
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe [Filter]
filters
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
marker
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Int
maxRecords

instance Prelude.NFData DescribeEndpoints where
  rnf :: DescribeEndpoints -> ()
rnf DescribeEndpoints' {Maybe Int
Maybe [Filter]
Maybe Text
maxRecords :: Maybe Int
marker :: Maybe Text
filters :: Maybe [Filter]
$sel:maxRecords:DescribeEndpoints' :: DescribeEndpoints -> Maybe Int
$sel:marker:DescribeEndpoints' :: DescribeEndpoints -> Maybe Text
$sel:filters:DescribeEndpoints' :: DescribeEndpoints -> Maybe [Filter]
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe [Filter]
filters
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
marker
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Int
maxRecords

instance Data.ToHeaders DescribeEndpoints where
  toHeaders :: DescribeEndpoints -> 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
"AmazonDMSv20160101.DescribeEndpoints" ::
                          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 DescribeEndpoints where
  toJSON :: DescribeEndpoints -> Value
toJSON DescribeEndpoints' {Maybe Int
Maybe [Filter]
Maybe Text
maxRecords :: Maybe Int
marker :: Maybe Text
filters :: Maybe [Filter]
$sel:maxRecords:DescribeEndpoints' :: DescribeEndpoints -> Maybe Int
$sel:marker:DescribeEndpoints' :: DescribeEndpoints -> Maybe Text
$sel:filters:DescribeEndpoints' :: DescribeEndpoints -> Maybe [Filter]
..} =
    [Pair] -> Value
Data.object
      ( forall a. [Maybe a] -> [a]
Prelude.catMaybes
          [ (Key
"Filters" 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 [Filter]
filters,
            (Key
"Marker" 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
marker,
            (Key
"MaxRecords" 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 Int
maxRecords
          ]
      )

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

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

-- |
--
-- /See:/ 'newDescribeEndpointsResponse' smart constructor.
data DescribeEndpointsResponse = DescribeEndpointsResponse'
  { -- | Endpoint description.
    DescribeEndpointsResponse -> Maybe [Endpoint]
endpoints :: Prelude.Maybe [Endpoint],
    -- | An optional pagination token provided by a previous request. If this
    -- parameter is specified, the response includes only records beyond the
    -- marker, up to the value specified by @MaxRecords@.
    DescribeEndpointsResponse -> Maybe Text
marker :: Prelude.Maybe Prelude.Text,
    -- | The response's http status code.
    DescribeEndpointsResponse -> Int
httpStatus :: Prelude.Int
  }
  deriving (DescribeEndpointsResponse -> DescribeEndpointsResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DescribeEndpointsResponse -> DescribeEndpointsResponse -> Bool
$c/= :: DescribeEndpointsResponse -> DescribeEndpointsResponse -> Bool
== :: DescribeEndpointsResponse -> DescribeEndpointsResponse -> Bool
$c== :: DescribeEndpointsResponse -> DescribeEndpointsResponse -> Bool
Prelude.Eq, Int -> DescribeEndpointsResponse -> ShowS
[DescribeEndpointsResponse] -> ShowS
DescribeEndpointsResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DescribeEndpointsResponse] -> ShowS
$cshowList :: [DescribeEndpointsResponse] -> ShowS
show :: DescribeEndpointsResponse -> String
$cshow :: DescribeEndpointsResponse -> String
showsPrec :: Int -> DescribeEndpointsResponse -> ShowS
$cshowsPrec :: Int -> DescribeEndpointsResponse -> ShowS
Prelude.Show, forall x.
Rep DescribeEndpointsResponse x -> DescribeEndpointsResponse
forall x.
DescribeEndpointsResponse -> Rep DescribeEndpointsResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep DescribeEndpointsResponse x -> DescribeEndpointsResponse
$cfrom :: forall x.
DescribeEndpointsResponse -> Rep DescribeEndpointsResponse x
Prelude.Generic)

-- |
-- Create a value of 'DescribeEndpointsResponse' 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:
--
-- 'endpoints', 'describeEndpointsResponse_endpoints' - Endpoint description.
--
-- 'marker', 'describeEndpointsResponse_marker' - An optional pagination token provided by a previous request. If this
-- parameter is specified, the response includes only records beyond the
-- marker, up to the value specified by @MaxRecords@.
--
-- 'httpStatus', 'describeEndpointsResponse_httpStatus' - The response's http status code.
newDescribeEndpointsResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  DescribeEndpointsResponse
newDescribeEndpointsResponse :: Int -> DescribeEndpointsResponse
newDescribeEndpointsResponse Int
pHttpStatus_ =
  DescribeEndpointsResponse'
    { $sel:endpoints:DescribeEndpointsResponse' :: Maybe [Endpoint]
endpoints =
        forall a. Maybe a
Prelude.Nothing,
      $sel:marker:DescribeEndpointsResponse' :: Maybe Text
marker = forall a. Maybe a
Prelude.Nothing,
      $sel:httpStatus:DescribeEndpointsResponse' :: Int
httpStatus = Int
pHttpStatus_
    }

-- | Endpoint description.
describeEndpointsResponse_endpoints :: Lens.Lens' DescribeEndpointsResponse (Prelude.Maybe [Endpoint])
describeEndpointsResponse_endpoints :: Lens' DescribeEndpointsResponse (Maybe [Endpoint])
describeEndpointsResponse_endpoints = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeEndpointsResponse' {Maybe [Endpoint]
endpoints :: Maybe [Endpoint]
$sel:endpoints:DescribeEndpointsResponse' :: DescribeEndpointsResponse -> Maybe [Endpoint]
endpoints} -> Maybe [Endpoint]
endpoints) (\s :: DescribeEndpointsResponse
s@DescribeEndpointsResponse' {} Maybe [Endpoint]
a -> DescribeEndpointsResponse
s {$sel:endpoints:DescribeEndpointsResponse' :: Maybe [Endpoint]
endpoints = Maybe [Endpoint]
a} :: DescribeEndpointsResponse) 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

-- | An optional pagination token provided by a previous request. If this
-- parameter is specified, the response includes only records beyond the
-- marker, up to the value specified by @MaxRecords@.
describeEndpointsResponse_marker :: Lens.Lens' DescribeEndpointsResponse (Prelude.Maybe Prelude.Text)
describeEndpointsResponse_marker :: Lens' DescribeEndpointsResponse (Maybe Text)
describeEndpointsResponse_marker = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeEndpointsResponse' {Maybe Text
marker :: Maybe Text
$sel:marker:DescribeEndpointsResponse' :: DescribeEndpointsResponse -> Maybe Text
marker} -> Maybe Text
marker) (\s :: DescribeEndpointsResponse
s@DescribeEndpointsResponse' {} Maybe Text
a -> DescribeEndpointsResponse
s {$sel:marker:DescribeEndpointsResponse' :: Maybe Text
marker = Maybe Text
a} :: DescribeEndpointsResponse)

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

instance Prelude.NFData DescribeEndpointsResponse where
  rnf :: DescribeEndpointsResponse -> ()
rnf DescribeEndpointsResponse' {Int
Maybe [Endpoint]
Maybe Text
httpStatus :: Int
marker :: Maybe Text
endpoints :: Maybe [Endpoint]
$sel:httpStatus:DescribeEndpointsResponse' :: DescribeEndpointsResponse -> Int
$sel:marker:DescribeEndpointsResponse' :: DescribeEndpointsResponse -> Maybe Text
$sel:endpoints:DescribeEndpointsResponse' :: DescribeEndpointsResponse -> Maybe [Endpoint]
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe [Endpoint]
endpoints
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
marker
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Int
httpStatus