{-# 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.DescribeEndpointTypes
-- 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 type of endpoints available.
--
-- This operation returns paginated results.
module Amazonka.DMS.DescribeEndpointTypes
  ( -- * Creating a Request
    DescribeEndpointTypes (..),
    newDescribeEndpointTypes,

    -- * Request Lenses
    describeEndpointTypes_filters,
    describeEndpointTypes_marker,
    describeEndpointTypes_maxRecords,

    -- * Destructuring the Response
    DescribeEndpointTypesResponse (..),
    newDescribeEndpointTypesResponse,

    -- * Response Lenses
    describeEndpointTypesResponse_marker,
    describeEndpointTypesResponse_supportedEndpointTypes,
    describeEndpointTypesResponse_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:/ 'newDescribeEndpointTypes' smart constructor.
data DescribeEndpointTypes = DescribeEndpointTypes'
  { -- | Filters applied to the endpoint types.
    --
    -- Valid filter names: engine-name | endpoint-type
    DescribeEndpointTypes -> 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@.
    DescribeEndpointTypes -> 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.
    DescribeEndpointTypes -> Maybe Int
maxRecords :: Prelude.Maybe Prelude.Int
  }
  deriving (DescribeEndpointTypes -> DescribeEndpointTypes -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DescribeEndpointTypes -> DescribeEndpointTypes -> Bool
$c/= :: DescribeEndpointTypes -> DescribeEndpointTypes -> Bool
== :: DescribeEndpointTypes -> DescribeEndpointTypes -> Bool
$c== :: DescribeEndpointTypes -> DescribeEndpointTypes -> Bool
Prelude.Eq, ReadPrec [DescribeEndpointTypes]
ReadPrec DescribeEndpointTypes
Int -> ReadS DescribeEndpointTypes
ReadS [DescribeEndpointTypes]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [DescribeEndpointTypes]
$creadListPrec :: ReadPrec [DescribeEndpointTypes]
readPrec :: ReadPrec DescribeEndpointTypes
$creadPrec :: ReadPrec DescribeEndpointTypes
readList :: ReadS [DescribeEndpointTypes]
$creadList :: ReadS [DescribeEndpointTypes]
readsPrec :: Int -> ReadS DescribeEndpointTypes
$creadsPrec :: Int -> ReadS DescribeEndpointTypes
Prelude.Read, Int -> DescribeEndpointTypes -> ShowS
[DescribeEndpointTypes] -> ShowS
DescribeEndpointTypes -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DescribeEndpointTypes] -> ShowS
$cshowList :: [DescribeEndpointTypes] -> ShowS
show :: DescribeEndpointTypes -> String
$cshow :: DescribeEndpointTypes -> String
showsPrec :: Int -> DescribeEndpointTypes -> ShowS
$cshowsPrec :: Int -> DescribeEndpointTypes -> ShowS
Prelude.Show, forall x. Rep DescribeEndpointTypes x -> DescribeEndpointTypes
forall x. DescribeEndpointTypes -> Rep DescribeEndpointTypes x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep DescribeEndpointTypes x -> DescribeEndpointTypes
$cfrom :: forall x. DescribeEndpointTypes -> Rep DescribeEndpointTypes x
Prelude.Generic)

-- |
-- Create a value of 'DescribeEndpointTypes' 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', 'describeEndpointTypes_filters' - Filters applied to the endpoint types.
--
-- Valid filter names: engine-name | endpoint-type
--
-- 'marker', 'describeEndpointTypes_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', 'describeEndpointTypes_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.
newDescribeEndpointTypes ::
  DescribeEndpointTypes
newDescribeEndpointTypes :: DescribeEndpointTypes
newDescribeEndpointTypes =
  DescribeEndpointTypes'
    { $sel:filters:DescribeEndpointTypes' :: Maybe [Filter]
filters = forall a. Maybe a
Prelude.Nothing,
      $sel:marker:DescribeEndpointTypes' :: Maybe Text
marker = forall a. Maybe a
Prelude.Nothing,
      $sel:maxRecords:DescribeEndpointTypes' :: Maybe Int
maxRecords = forall a. Maybe a
Prelude.Nothing
    }

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

-- | 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.
describeEndpointTypes_maxRecords :: Lens.Lens' DescribeEndpointTypes (Prelude.Maybe Prelude.Int)
describeEndpointTypes_maxRecords :: Lens' DescribeEndpointTypes (Maybe Int)
describeEndpointTypes_maxRecords = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeEndpointTypes' {Maybe Int
maxRecords :: Maybe Int
$sel:maxRecords:DescribeEndpointTypes' :: DescribeEndpointTypes -> Maybe Int
maxRecords} -> Maybe Int
maxRecords) (\s :: DescribeEndpointTypes
s@DescribeEndpointTypes' {} Maybe Int
a -> DescribeEndpointTypes
s {$sel:maxRecords:DescribeEndpointTypes' :: Maybe Int
maxRecords = Maybe Int
a} :: DescribeEndpointTypes)

instance Core.AWSPager DescribeEndpointTypes where
  page :: DescribeEndpointTypes
-> AWSResponse DescribeEndpointTypes -> Maybe DescribeEndpointTypes
page DescribeEndpointTypes
rq AWSResponse DescribeEndpointTypes
rs
    | forall a. AWSTruncated a => a -> Bool
Core.stop
        ( AWSResponse DescribeEndpointTypes
rs
            forall s a. s -> Getting (First a) s a -> Maybe a
Lens.^? Lens' DescribeEndpointTypesResponse (Maybe Text)
describeEndpointTypesResponse_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 DescribeEndpointTypes
rs
            forall s a. s -> Getting (First a) s a -> Maybe a
Lens.^? Lens' DescribeEndpointTypesResponse (Maybe [SupportedEndpointType])
describeEndpointTypesResponse_supportedEndpointTypes
            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.$ DescribeEndpointTypes
rq
          forall a b. a -> (a -> b) -> b
Prelude.& Lens' DescribeEndpointTypes (Maybe Text)
describeEndpointTypes_marker
          forall s t a b. ASetter s t a b -> b -> s -> t
Lens..~ AWSResponse DescribeEndpointTypes
rs
          forall s a. s -> Getting (First a) s a -> Maybe a
Lens.^? Lens' DescribeEndpointTypesResponse (Maybe Text)
describeEndpointTypesResponse_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 DescribeEndpointTypes where
  type
    AWSResponse DescribeEndpointTypes =
      DescribeEndpointTypesResponse
  request :: (Service -> Service)
-> DescribeEndpointTypes -> Request DescribeEndpointTypes
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 DescribeEndpointTypes
-> ClientResponse ClientBody
-> m (Either
        Error (ClientResponse (AWSResponse DescribeEndpointTypes)))
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 [SupportedEndpointType]
-> Int
-> DescribeEndpointTypesResponse
DescribeEndpointTypesResponse'
            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
"Marker")
            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
"SupportedEndpointTypes"
                            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 DescribeEndpointTypes where
  hashWithSalt :: Int -> DescribeEndpointTypes -> Int
hashWithSalt Int
_salt DescribeEndpointTypes' {Maybe Int
Maybe [Filter]
Maybe Text
maxRecords :: Maybe Int
marker :: Maybe Text
filters :: Maybe [Filter]
$sel:maxRecords:DescribeEndpointTypes' :: DescribeEndpointTypes -> Maybe Int
$sel:marker:DescribeEndpointTypes' :: DescribeEndpointTypes -> Maybe Text
$sel:filters:DescribeEndpointTypes' :: DescribeEndpointTypes -> 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 DescribeEndpointTypes where
  rnf :: DescribeEndpointTypes -> ()
rnf DescribeEndpointTypes' {Maybe Int
Maybe [Filter]
Maybe Text
maxRecords :: Maybe Int
marker :: Maybe Text
filters :: Maybe [Filter]
$sel:maxRecords:DescribeEndpointTypes' :: DescribeEndpointTypes -> Maybe Int
$sel:marker:DescribeEndpointTypes' :: DescribeEndpointTypes -> Maybe Text
$sel:filters:DescribeEndpointTypes' :: DescribeEndpointTypes -> 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 DescribeEndpointTypes where
  toHeaders :: DescribeEndpointTypes -> 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.DescribeEndpointTypes" ::
                          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 DescribeEndpointTypes where
  toJSON :: DescribeEndpointTypes -> Value
toJSON DescribeEndpointTypes' {Maybe Int
Maybe [Filter]
Maybe Text
maxRecords :: Maybe Int
marker :: Maybe Text
filters :: Maybe [Filter]
$sel:maxRecords:DescribeEndpointTypes' :: DescribeEndpointTypes -> Maybe Int
$sel:marker:DescribeEndpointTypes' :: DescribeEndpointTypes -> Maybe Text
$sel:filters:DescribeEndpointTypes' :: DescribeEndpointTypes -> 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 DescribeEndpointTypes where
  toPath :: DescribeEndpointTypes -> ByteString
toPath = forall a b. a -> b -> a
Prelude.const ByteString
"/"

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

-- |
--
-- /See:/ 'newDescribeEndpointTypesResponse' smart constructor.
data DescribeEndpointTypesResponse = DescribeEndpointTypesResponse'
  { -- | 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@.
    DescribeEndpointTypesResponse -> Maybe Text
marker :: Prelude.Maybe Prelude.Text,
    -- | The types of endpoints that are supported.
    DescribeEndpointTypesResponse -> Maybe [SupportedEndpointType]
supportedEndpointTypes :: Prelude.Maybe [SupportedEndpointType],
    -- | The response's http status code.
    DescribeEndpointTypesResponse -> Int
httpStatus :: Prelude.Int
  }
  deriving (DescribeEndpointTypesResponse
-> DescribeEndpointTypesResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DescribeEndpointTypesResponse
-> DescribeEndpointTypesResponse -> Bool
$c/= :: DescribeEndpointTypesResponse
-> DescribeEndpointTypesResponse -> Bool
== :: DescribeEndpointTypesResponse
-> DescribeEndpointTypesResponse -> Bool
$c== :: DescribeEndpointTypesResponse
-> DescribeEndpointTypesResponse -> Bool
Prelude.Eq, ReadPrec [DescribeEndpointTypesResponse]
ReadPrec DescribeEndpointTypesResponse
Int -> ReadS DescribeEndpointTypesResponse
ReadS [DescribeEndpointTypesResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [DescribeEndpointTypesResponse]
$creadListPrec :: ReadPrec [DescribeEndpointTypesResponse]
readPrec :: ReadPrec DescribeEndpointTypesResponse
$creadPrec :: ReadPrec DescribeEndpointTypesResponse
readList :: ReadS [DescribeEndpointTypesResponse]
$creadList :: ReadS [DescribeEndpointTypesResponse]
readsPrec :: Int -> ReadS DescribeEndpointTypesResponse
$creadsPrec :: Int -> ReadS DescribeEndpointTypesResponse
Prelude.Read, Int -> DescribeEndpointTypesResponse -> ShowS
[DescribeEndpointTypesResponse] -> ShowS
DescribeEndpointTypesResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DescribeEndpointTypesResponse] -> ShowS
$cshowList :: [DescribeEndpointTypesResponse] -> ShowS
show :: DescribeEndpointTypesResponse -> String
$cshow :: DescribeEndpointTypesResponse -> String
showsPrec :: Int -> DescribeEndpointTypesResponse -> ShowS
$cshowsPrec :: Int -> DescribeEndpointTypesResponse -> ShowS
Prelude.Show, forall x.
Rep DescribeEndpointTypesResponse x
-> DescribeEndpointTypesResponse
forall x.
DescribeEndpointTypesResponse
-> Rep DescribeEndpointTypesResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep DescribeEndpointTypesResponse x
-> DescribeEndpointTypesResponse
$cfrom :: forall x.
DescribeEndpointTypesResponse
-> Rep DescribeEndpointTypesResponse x
Prelude.Generic)

-- |
-- Create a value of 'DescribeEndpointTypesResponse' 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:
--
-- 'marker', 'describeEndpointTypesResponse_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@.
--
-- 'supportedEndpointTypes', 'describeEndpointTypesResponse_supportedEndpointTypes' - The types of endpoints that are supported.
--
-- 'httpStatus', 'describeEndpointTypesResponse_httpStatus' - The response's http status code.
newDescribeEndpointTypesResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  DescribeEndpointTypesResponse
newDescribeEndpointTypesResponse :: Int -> DescribeEndpointTypesResponse
newDescribeEndpointTypesResponse Int
pHttpStatus_ =
  DescribeEndpointTypesResponse'
    { $sel:marker:DescribeEndpointTypesResponse' :: Maybe Text
marker =
        forall a. Maybe a
Prelude.Nothing,
      $sel:supportedEndpointTypes:DescribeEndpointTypesResponse' :: Maybe [SupportedEndpointType]
supportedEndpointTypes = forall a. Maybe a
Prelude.Nothing,
      $sel:httpStatus:DescribeEndpointTypesResponse' :: Int
httpStatus = Int
pHttpStatus_
    }

-- | 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@.
describeEndpointTypesResponse_marker :: Lens.Lens' DescribeEndpointTypesResponse (Prelude.Maybe Prelude.Text)
describeEndpointTypesResponse_marker :: Lens' DescribeEndpointTypesResponse (Maybe Text)
describeEndpointTypesResponse_marker = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeEndpointTypesResponse' {Maybe Text
marker :: Maybe Text
$sel:marker:DescribeEndpointTypesResponse' :: DescribeEndpointTypesResponse -> Maybe Text
marker} -> Maybe Text
marker) (\s :: DescribeEndpointTypesResponse
s@DescribeEndpointTypesResponse' {} Maybe Text
a -> DescribeEndpointTypesResponse
s {$sel:marker:DescribeEndpointTypesResponse' :: Maybe Text
marker = Maybe Text
a} :: DescribeEndpointTypesResponse)

-- | The types of endpoints that are supported.
describeEndpointTypesResponse_supportedEndpointTypes :: Lens.Lens' DescribeEndpointTypesResponse (Prelude.Maybe [SupportedEndpointType])
describeEndpointTypesResponse_supportedEndpointTypes :: Lens' DescribeEndpointTypesResponse (Maybe [SupportedEndpointType])
describeEndpointTypesResponse_supportedEndpointTypes = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeEndpointTypesResponse' {Maybe [SupportedEndpointType]
supportedEndpointTypes :: Maybe [SupportedEndpointType]
$sel:supportedEndpointTypes:DescribeEndpointTypesResponse' :: DescribeEndpointTypesResponse -> Maybe [SupportedEndpointType]
supportedEndpointTypes} -> Maybe [SupportedEndpointType]
supportedEndpointTypes) (\s :: DescribeEndpointTypesResponse
s@DescribeEndpointTypesResponse' {} Maybe [SupportedEndpointType]
a -> DescribeEndpointTypesResponse
s {$sel:supportedEndpointTypes:DescribeEndpointTypesResponse' :: Maybe [SupportedEndpointType]
supportedEndpointTypes = Maybe [SupportedEndpointType]
a} :: DescribeEndpointTypesResponse) 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.
describeEndpointTypesResponse_httpStatus :: Lens.Lens' DescribeEndpointTypesResponse Prelude.Int
describeEndpointTypesResponse_httpStatus :: Lens' DescribeEndpointTypesResponse Int
describeEndpointTypesResponse_httpStatus = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeEndpointTypesResponse' {Int
httpStatus :: Int
$sel:httpStatus:DescribeEndpointTypesResponse' :: DescribeEndpointTypesResponse -> Int
httpStatus} -> Int
httpStatus) (\s :: DescribeEndpointTypesResponse
s@DescribeEndpointTypesResponse' {} Int
a -> DescribeEndpointTypesResponse
s {$sel:httpStatus:DescribeEndpointTypesResponse' :: Int
httpStatus = Int
a} :: DescribeEndpointTypesResponse)

instance Prelude.NFData DescribeEndpointTypesResponse where
  rnf :: DescribeEndpointTypesResponse -> ()
rnf DescribeEndpointTypesResponse' {Int
Maybe [SupportedEndpointType]
Maybe Text
httpStatus :: Int
supportedEndpointTypes :: Maybe [SupportedEndpointType]
marker :: Maybe Text
$sel:httpStatus:DescribeEndpointTypesResponse' :: DescribeEndpointTypesResponse -> Int
$sel:supportedEndpointTypes:DescribeEndpointTypesResponse' :: DescribeEndpointTypesResponse -> Maybe [SupportedEndpointType]
$sel:marker:DescribeEndpointTypesResponse' :: DescribeEndpointTypesResponse -> Maybe Text
..} =
    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 [SupportedEndpointType]
supportedEndpointTypes
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Int
httpStatus