{-# 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.ElasticSearch.DescribeInboundCrossClusterSearchConnections
-- 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 inbound cross-cluster search connections for a destination
-- domain.
module Amazonka.ElasticSearch.DescribeInboundCrossClusterSearchConnections
  ( -- * Creating a Request
    DescribeInboundCrossClusterSearchConnections (..),
    newDescribeInboundCrossClusterSearchConnections,

    -- * Request Lenses
    describeInboundCrossClusterSearchConnections_filters,
    describeInboundCrossClusterSearchConnections_maxResults,
    describeInboundCrossClusterSearchConnections_nextToken,

    -- * Destructuring the Response
    DescribeInboundCrossClusterSearchConnectionsResponse (..),
    newDescribeInboundCrossClusterSearchConnectionsResponse,

    -- * Response Lenses
    describeInboundCrossClusterSearchConnectionsResponse_crossClusterSearchConnections,
    describeInboundCrossClusterSearchConnectionsResponse_nextToken,
    describeInboundCrossClusterSearchConnectionsResponse_httpStatus,
  )
where

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

-- | Container for the parameters to the
-- @DescribeInboundCrossClusterSearchConnections@ operation.
--
-- /See:/ 'newDescribeInboundCrossClusterSearchConnections' smart constructor.
data DescribeInboundCrossClusterSearchConnections = DescribeInboundCrossClusterSearchConnections'
  { -- | A list of filters used to match properties for inbound cross-cluster
    -- search connection. Available @Filter@ names for this operation are:
    --
    -- -   cross-cluster-search-connection-id
    -- -   source-domain-info.domain-name
    -- -   source-domain-info.owner-id
    -- -   source-domain-info.region
    -- -   destination-domain-info.domain-name
    DescribeInboundCrossClusterSearchConnections -> Maybe [Filter]
filters :: Prelude.Maybe [Filter],
    -- | Set this value to limit the number of results returned. If not
    -- specified, defaults to 100.
    DescribeInboundCrossClusterSearchConnections -> Maybe Int
maxResults :: Prelude.Maybe Prelude.Int,
    -- | NextToken is sent in case the earlier API call results contain the
    -- NextToken. It is used for pagination.
    DescribeInboundCrossClusterSearchConnections -> Maybe Text
nextToken :: Prelude.Maybe Prelude.Text
  }
  deriving (DescribeInboundCrossClusterSearchConnections
-> DescribeInboundCrossClusterSearchConnections -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DescribeInboundCrossClusterSearchConnections
-> DescribeInboundCrossClusterSearchConnections -> Bool
$c/= :: DescribeInboundCrossClusterSearchConnections
-> DescribeInboundCrossClusterSearchConnections -> Bool
== :: DescribeInboundCrossClusterSearchConnections
-> DescribeInboundCrossClusterSearchConnections -> Bool
$c== :: DescribeInboundCrossClusterSearchConnections
-> DescribeInboundCrossClusterSearchConnections -> Bool
Prelude.Eq, ReadPrec [DescribeInboundCrossClusterSearchConnections]
ReadPrec DescribeInboundCrossClusterSearchConnections
Int -> ReadS DescribeInboundCrossClusterSearchConnections
ReadS [DescribeInboundCrossClusterSearchConnections]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [DescribeInboundCrossClusterSearchConnections]
$creadListPrec :: ReadPrec [DescribeInboundCrossClusterSearchConnections]
readPrec :: ReadPrec DescribeInboundCrossClusterSearchConnections
$creadPrec :: ReadPrec DescribeInboundCrossClusterSearchConnections
readList :: ReadS [DescribeInboundCrossClusterSearchConnections]
$creadList :: ReadS [DescribeInboundCrossClusterSearchConnections]
readsPrec :: Int -> ReadS DescribeInboundCrossClusterSearchConnections
$creadsPrec :: Int -> ReadS DescribeInboundCrossClusterSearchConnections
Prelude.Read, Int -> DescribeInboundCrossClusterSearchConnections -> ShowS
[DescribeInboundCrossClusterSearchConnections] -> ShowS
DescribeInboundCrossClusterSearchConnections -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DescribeInboundCrossClusterSearchConnections] -> ShowS
$cshowList :: [DescribeInboundCrossClusterSearchConnections] -> ShowS
show :: DescribeInboundCrossClusterSearchConnections -> String
$cshow :: DescribeInboundCrossClusterSearchConnections -> String
showsPrec :: Int -> DescribeInboundCrossClusterSearchConnections -> ShowS
$cshowsPrec :: Int -> DescribeInboundCrossClusterSearchConnections -> ShowS
Prelude.Show, forall x.
Rep DescribeInboundCrossClusterSearchConnections x
-> DescribeInboundCrossClusterSearchConnections
forall x.
DescribeInboundCrossClusterSearchConnections
-> Rep DescribeInboundCrossClusterSearchConnections x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep DescribeInboundCrossClusterSearchConnections x
-> DescribeInboundCrossClusterSearchConnections
$cfrom :: forall x.
DescribeInboundCrossClusterSearchConnections
-> Rep DescribeInboundCrossClusterSearchConnections x
Prelude.Generic)

-- |
-- Create a value of 'DescribeInboundCrossClusterSearchConnections' 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', 'describeInboundCrossClusterSearchConnections_filters' - A list of filters used to match properties for inbound cross-cluster
-- search connection. Available @Filter@ names for this operation are:
--
-- -   cross-cluster-search-connection-id
-- -   source-domain-info.domain-name
-- -   source-domain-info.owner-id
-- -   source-domain-info.region
-- -   destination-domain-info.domain-name
--
-- 'maxResults', 'describeInboundCrossClusterSearchConnections_maxResults' - Set this value to limit the number of results returned. If not
-- specified, defaults to 100.
--
-- 'nextToken', 'describeInboundCrossClusterSearchConnections_nextToken' - NextToken is sent in case the earlier API call results contain the
-- NextToken. It is used for pagination.
newDescribeInboundCrossClusterSearchConnections ::
  DescribeInboundCrossClusterSearchConnections
newDescribeInboundCrossClusterSearchConnections :: DescribeInboundCrossClusterSearchConnections
newDescribeInboundCrossClusterSearchConnections =
  DescribeInboundCrossClusterSearchConnections'
    { $sel:filters:DescribeInboundCrossClusterSearchConnections' :: Maybe [Filter]
filters =
        forall a. Maybe a
Prelude.Nothing,
      $sel:maxResults:DescribeInboundCrossClusterSearchConnections' :: Maybe Int
maxResults = forall a. Maybe a
Prelude.Nothing,
      $sel:nextToken:DescribeInboundCrossClusterSearchConnections' :: Maybe Text
nextToken = forall a. Maybe a
Prelude.Nothing
    }

-- | A list of filters used to match properties for inbound cross-cluster
-- search connection. Available @Filter@ names for this operation are:
--
-- -   cross-cluster-search-connection-id
-- -   source-domain-info.domain-name
-- -   source-domain-info.owner-id
-- -   source-domain-info.region
-- -   destination-domain-info.domain-name
describeInboundCrossClusterSearchConnections_filters :: Lens.Lens' DescribeInboundCrossClusterSearchConnections (Prelude.Maybe [Filter])
describeInboundCrossClusterSearchConnections_filters :: Lens' DescribeInboundCrossClusterSearchConnections (Maybe [Filter])
describeInboundCrossClusterSearchConnections_filters = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeInboundCrossClusterSearchConnections' {Maybe [Filter]
filters :: Maybe [Filter]
$sel:filters:DescribeInboundCrossClusterSearchConnections' :: DescribeInboundCrossClusterSearchConnections -> Maybe [Filter]
filters} -> Maybe [Filter]
filters) (\s :: DescribeInboundCrossClusterSearchConnections
s@DescribeInboundCrossClusterSearchConnections' {} Maybe [Filter]
a -> DescribeInboundCrossClusterSearchConnections
s {$sel:filters:DescribeInboundCrossClusterSearchConnections' :: Maybe [Filter]
filters = Maybe [Filter]
a} :: DescribeInboundCrossClusterSearchConnections) 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

-- | Set this value to limit the number of results returned. If not
-- specified, defaults to 100.
describeInboundCrossClusterSearchConnections_maxResults :: Lens.Lens' DescribeInboundCrossClusterSearchConnections (Prelude.Maybe Prelude.Int)
describeInboundCrossClusterSearchConnections_maxResults :: Lens' DescribeInboundCrossClusterSearchConnections (Maybe Int)
describeInboundCrossClusterSearchConnections_maxResults = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeInboundCrossClusterSearchConnections' {Maybe Int
maxResults :: Maybe Int
$sel:maxResults:DescribeInboundCrossClusterSearchConnections' :: DescribeInboundCrossClusterSearchConnections -> Maybe Int
maxResults} -> Maybe Int
maxResults) (\s :: DescribeInboundCrossClusterSearchConnections
s@DescribeInboundCrossClusterSearchConnections' {} Maybe Int
a -> DescribeInboundCrossClusterSearchConnections
s {$sel:maxResults:DescribeInboundCrossClusterSearchConnections' :: Maybe Int
maxResults = Maybe Int
a} :: DescribeInboundCrossClusterSearchConnections)

-- | NextToken is sent in case the earlier API call results contain the
-- NextToken. It is used for pagination.
describeInboundCrossClusterSearchConnections_nextToken :: Lens.Lens' DescribeInboundCrossClusterSearchConnections (Prelude.Maybe Prelude.Text)
describeInboundCrossClusterSearchConnections_nextToken :: Lens' DescribeInboundCrossClusterSearchConnections (Maybe Text)
describeInboundCrossClusterSearchConnections_nextToken = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeInboundCrossClusterSearchConnections' {Maybe Text
nextToken :: Maybe Text
$sel:nextToken:DescribeInboundCrossClusterSearchConnections' :: DescribeInboundCrossClusterSearchConnections -> Maybe Text
nextToken} -> Maybe Text
nextToken) (\s :: DescribeInboundCrossClusterSearchConnections
s@DescribeInboundCrossClusterSearchConnections' {} Maybe Text
a -> DescribeInboundCrossClusterSearchConnections
s {$sel:nextToken:DescribeInboundCrossClusterSearchConnections' :: Maybe Text
nextToken = Maybe Text
a} :: DescribeInboundCrossClusterSearchConnections)

instance
  Core.AWSRequest
    DescribeInboundCrossClusterSearchConnections
  where
  type
    AWSResponse
      DescribeInboundCrossClusterSearchConnections =
      DescribeInboundCrossClusterSearchConnectionsResponse
  request :: (Service -> Service)
-> DescribeInboundCrossClusterSearchConnections
-> Request DescribeInboundCrossClusterSearchConnections
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 DescribeInboundCrossClusterSearchConnections
-> ClientResponse ClientBody
-> m (Either
        Error
        (ClientResponse
           (AWSResponse DescribeInboundCrossClusterSearchConnections)))
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 [InboundCrossClusterSearchConnection]
-> Maybe Text
-> Int
-> DescribeInboundCrossClusterSearchConnectionsResponse
DescribeInboundCrossClusterSearchConnectionsResponse'
            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
"CrossClusterSearchConnections"
                            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
    DescribeInboundCrossClusterSearchConnections
  where
  hashWithSalt :: Int -> DescribeInboundCrossClusterSearchConnections -> Int
hashWithSalt
    Int
_salt
    DescribeInboundCrossClusterSearchConnections' {Maybe Int
Maybe [Filter]
Maybe Text
nextToken :: Maybe Text
maxResults :: Maybe Int
filters :: Maybe [Filter]
$sel:nextToken:DescribeInboundCrossClusterSearchConnections' :: DescribeInboundCrossClusterSearchConnections -> Maybe Text
$sel:maxResults:DescribeInboundCrossClusterSearchConnections' :: DescribeInboundCrossClusterSearchConnections -> Maybe Int
$sel:filters:DescribeInboundCrossClusterSearchConnections' :: DescribeInboundCrossClusterSearchConnections -> 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 Int
maxResults
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
nextToken

instance
  Prelude.NFData
    DescribeInboundCrossClusterSearchConnections
  where
  rnf :: DescribeInboundCrossClusterSearchConnections -> ()
rnf DescribeInboundCrossClusterSearchConnections' {Maybe Int
Maybe [Filter]
Maybe Text
nextToken :: Maybe Text
maxResults :: Maybe Int
filters :: Maybe [Filter]
$sel:nextToken:DescribeInboundCrossClusterSearchConnections' :: DescribeInboundCrossClusterSearchConnections -> Maybe Text
$sel:maxResults:DescribeInboundCrossClusterSearchConnections' :: DescribeInboundCrossClusterSearchConnections -> Maybe Int
$sel:filters:DescribeInboundCrossClusterSearchConnections' :: DescribeInboundCrossClusterSearchConnections -> 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 Int
maxResults
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
nextToken

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

instance
  Data.ToJSON
    DescribeInboundCrossClusterSearchConnections
  where
  toJSON :: DescribeInboundCrossClusterSearchConnections -> Value
toJSON
    DescribeInboundCrossClusterSearchConnections' {Maybe Int
Maybe [Filter]
Maybe Text
nextToken :: Maybe Text
maxResults :: Maybe Int
filters :: Maybe [Filter]
$sel:nextToken:DescribeInboundCrossClusterSearchConnections' :: DescribeInboundCrossClusterSearchConnections -> Maybe Text
$sel:maxResults:DescribeInboundCrossClusterSearchConnections' :: DescribeInboundCrossClusterSearchConnections -> Maybe Int
$sel:filters:DescribeInboundCrossClusterSearchConnections' :: DescribeInboundCrossClusterSearchConnections -> 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
"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 Int
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
    DescribeInboundCrossClusterSearchConnections
  where
  toPath :: DescribeInboundCrossClusterSearchConnections -> ByteString
toPath =
    forall a b. a -> b -> a
Prelude.const
      ByteString
"/2015-01-01/es/ccs/inboundConnection/search"

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

-- | The result of a @DescribeInboundCrossClusterSearchConnections@ request.
-- Contains the list of connections matching the filter criteria.
--
-- /See:/ 'newDescribeInboundCrossClusterSearchConnectionsResponse' smart constructor.
data DescribeInboundCrossClusterSearchConnectionsResponse = DescribeInboundCrossClusterSearchConnectionsResponse'
  { -- | Consists of list of @InboundCrossClusterSearchConnection@ matching the
    -- specified filter criteria.
    DescribeInboundCrossClusterSearchConnectionsResponse
-> Maybe [InboundCrossClusterSearchConnection]
crossClusterSearchConnections :: Prelude.Maybe [InboundCrossClusterSearchConnection],
    -- | If more results are available and NextToken is present, make the next
    -- request to the same API with the received NextToken to paginate the
    -- remaining results.
    DescribeInboundCrossClusterSearchConnectionsResponse -> Maybe Text
nextToken :: Prelude.Maybe Prelude.Text,
    -- | The response's http status code.
    DescribeInboundCrossClusterSearchConnectionsResponse -> Int
httpStatus :: Prelude.Int
  }
  deriving (DescribeInboundCrossClusterSearchConnectionsResponse
-> DescribeInboundCrossClusterSearchConnectionsResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DescribeInboundCrossClusterSearchConnectionsResponse
-> DescribeInboundCrossClusterSearchConnectionsResponse -> Bool
$c/= :: DescribeInboundCrossClusterSearchConnectionsResponse
-> DescribeInboundCrossClusterSearchConnectionsResponse -> Bool
== :: DescribeInboundCrossClusterSearchConnectionsResponse
-> DescribeInboundCrossClusterSearchConnectionsResponse -> Bool
$c== :: DescribeInboundCrossClusterSearchConnectionsResponse
-> DescribeInboundCrossClusterSearchConnectionsResponse -> Bool
Prelude.Eq, ReadPrec [DescribeInboundCrossClusterSearchConnectionsResponse]
ReadPrec DescribeInboundCrossClusterSearchConnectionsResponse
Int -> ReadS DescribeInboundCrossClusterSearchConnectionsResponse
ReadS [DescribeInboundCrossClusterSearchConnectionsResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [DescribeInboundCrossClusterSearchConnectionsResponse]
$creadListPrec :: ReadPrec [DescribeInboundCrossClusterSearchConnectionsResponse]
readPrec :: ReadPrec DescribeInboundCrossClusterSearchConnectionsResponse
$creadPrec :: ReadPrec DescribeInboundCrossClusterSearchConnectionsResponse
readList :: ReadS [DescribeInboundCrossClusterSearchConnectionsResponse]
$creadList :: ReadS [DescribeInboundCrossClusterSearchConnectionsResponse]
readsPrec :: Int -> ReadS DescribeInboundCrossClusterSearchConnectionsResponse
$creadsPrec :: Int -> ReadS DescribeInboundCrossClusterSearchConnectionsResponse
Prelude.Read, Int
-> DescribeInboundCrossClusterSearchConnectionsResponse -> ShowS
[DescribeInboundCrossClusterSearchConnectionsResponse] -> ShowS
DescribeInboundCrossClusterSearchConnectionsResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DescribeInboundCrossClusterSearchConnectionsResponse] -> ShowS
$cshowList :: [DescribeInboundCrossClusterSearchConnectionsResponse] -> ShowS
show :: DescribeInboundCrossClusterSearchConnectionsResponse -> String
$cshow :: DescribeInboundCrossClusterSearchConnectionsResponse -> String
showsPrec :: Int
-> DescribeInboundCrossClusterSearchConnectionsResponse -> ShowS
$cshowsPrec :: Int
-> DescribeInboundCrossClusterSearchConnectionsResponse -> ShowS
Prelude.Show, forall x.
Rep DescribeInboundCrossClusterSearchConnectionsResponse x
-> DescribeInboundCrossClusterSearchConnectionsResponse
forall x.
DescribeInboundCrossClusterSearchConnectionsResponse
-> Rep DescribeInboundCrossClusterSearchConnectionsResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep DescribeInboundCrossClusterSearchConnectionsResponse x
-> DescribeInboundCrossClusterSearchConnectionsResponse
$cfrom :: forall x.
DescribeInboundCrossClusterSearchConnectionsResponse
-> Rep DescribeInboundCrossClusterSearchConnectionsResponse x
Prelude.Generic)

-- |
-- Create a value of 'DescribeInboundCrossClusterSearchConnectionsResponse' 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:
--
-- 'crossClusterSearchConnections', 'describeInboundCrossClusterSearchConnectionsResponse_crossClusterSearchConnections' - Consists of list of @InboundCrossClusterSearchConnection@ matching the
-- specified filter criteria.
--
-- 'nextToken', 'describeInboundCrossClusterSearchConnectionsResponse_nextToken' - If more results are available and NextToken is present, make the next
-- request to the same API with the received NextToken to paginate the
-- remaining results.
--
-- 'httpStatus', 'describeInboundCrossClusterSearchConnectionsResponse_httpStatus' - The response's http status code.
newDescribeInboundCrossClusterSearchConnectionsResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  DescribeInboundCrossClusterSearchConnectionsResponse
newDescribeInboundCrossClusterSearchConnectionsResponse :: Int -> DescribeInboundCrossClusterSearchConnectionsResponse
newDescribeInboundCrossClusterSearchConnectionsResponse
  Int
pHttpStatus_ =
    DescribeInboundCrossClusterSearchConnectionsResponse'
      { $sel:crossClusterSearchConnections:DescribeInboundCrossClusterSearchConnectionsResponse' :: Maybe [InboundCrossClusterSearchConnection]
crossClusterSearchConnections =
          forall a. Maybe a
Prelude.Nothing,
        $sel:nextToken:DescribeInboundCrossClusterSearchConnectionsResponse' :: Maybe Text
nextToken =
          forall a. Maybe a
Prelude.Nothing,
        $sel:httpStatus:DescribeInboundCrossClusterSearchConnectionsResponse' :: Int
httpStatus =
          Int
pHttpStatus_
      }

-- | Consists of list of @InboundCrossClusterSearchConnection@ matching the
-- specified filter criteria.
describeInboundCrossClusterSearchConnectionsResponse_crossClusterSearchConnections :: Lens.Lens' DescribeInboundCrossClusterSearchConnectionsResponse (Prelude.Maybe [InboundCrossClusterSearchConnection])
describeInboundCrossClusterSearchConnectionsResponse_crossClusterSearchConnections :: Lens'
  DescribeInboundCrossClusterSearchConnectionsResponse
  (Maybe [InboundCrossClusterSearchConnection])
describeInboundCrossClusterSearchConnectionsResponse_crossClusterSearchConnections = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeInboundCrossClusterSearchConnectionsResponse' {Maybe [InboundCrossClusterSearchConnection]
crossClusterSearchConnections :: Maybe [InboundCrossClusterSearchConnection]
$sel:crossClusterSearchConnections:DescribeInboundCrossClusterSearchConnectionsResponse' :: DescribeInboundCrossClusterSearchConnectionsResponse
-> Maybe [InboundCrossClusterSearchConnection]
crossClusterSearchConnections} -> Maybe [InboundCrossClusterSearchConnection]
crossClusterSearchConnections) (\s :: DescribeInboundCrossClusterSearchConnectionsResponse
s@DescribeInboundCrossClusterSearchConnectionsResponse' {} Maybe [InboundCrossClusterSearchConnection]
a -> DescribeInboundCrossClusterSearchConnectionsResponse
s {$sel:crossClusterSearchConnections:DescribeInboundCrossClusterSearchConnectionsResponse' :: Maybe [InboundCrossClusterSearchConnection]
crossClusterSearchConnections = Maybe [InboundCrossClusterSearchConnection]
a} :: DescribeInboundCrossClusterSearchConnectionsResponse) 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

-- | If more results are available and NextToken is present, make the next
-- request to the same API with the received NextToken to paginate the
-- remaining results.
describeInboundCrossClusterSearchConnectionsResponse_nextToken :: Lens.Lens' DescribeInboundCrossClusterSearchConnectionsResponse (Prelude.Maybe Prelude.Text)
describeInboundCrossClusterSearchConnectionsResponse_nextToken :: Lens'
  DescribeInboundCrossClusterSearchConnectionsResponse (Maybe Text)
describeInboundCrossClusterSearchConnectionsResponse_nextToken = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeInboundCrossClusterSearchConnectionsResponse' {Maybe Text
nextToken :: Maybe Text
$sel:nextToken:DescribeInboundCrossClusterSearchConnectionsResponse' :: DescribeInboundCrossClusterSearchConnectionsResponse -> Maybe Text
nextToken} -> Maybe Text
nextToken) (\s :: DescribeInboundCrossClusterSearchConnectionsResponse
s@DescribeInboundCrossClusterSearchConnectionsResponse' {} Maybe Text
a -> DescribeInboundCrossClusterSearchConnectionsResponse
s {$sel:nextToken:DescribeInboundCrossClusterSearchConnectionsResponse' :: Maybe Text
nextToken = Maybe Text
a} :: DescribeInboundCrossClusterSearchConnectionsResponse)

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

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