{-# 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.QuickSight.SearchDataSources
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
--
-- Use the @SearchDataSources@ operation to search for data sources that
-- belong to an account.
--
-- This operation returns paginated results.
module Amazonka.QuickSight.SearchDataSources
  ( -- * Creating a Request
    SearchDataSources (..),
    newSearchDataSources,

    -- * Request Lenses
    searchDataSources_maxResults,
    searchDataSources_nextToken,
    searchDataSources_awsAccountId,
    searchDataSources_filters,

    -- * Destructuring the Response
    SearchDataSourcesResponse (..),
    newSearchDataSourcesResponse,

    -- * Response Lenses
    searchDataSourcesResponse_dataSourceSummaries,
    searchDataSourcesResponse_nextToken,
    searchDataSourcesResponse_requestId,
    searchDataSourcesResponse_status,
  )
where

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 Amazonka.QuickSight.Types
import qualified Amazonka.Request as Request
import qualified Amazonka.Response as Response

-- | /See:/ 'newSearchDataSources' smart constructor.
data SearchDataSources = SearchDataSources'
  { -- | The maximum number of results to be returned per request.
    SearchDataSources -> Maybe Natural
maxResults :: Prelude.Maybe Prelude.Natural,
    -- | A pagination token that can be used in a subsequent request.
    SearchDataSources -> Maybe Text
nextToken :: Prelude.Maybe Prelude.Text,
    -- | The Amazon Web Services account ID.
    SearchDataSources -> Text
awsAccountId :: Prelude.Text,
    -- | The filters to apply to the search.
    SearchDataSources -> NonEmpty DataSourceSearchFilter
filters :: Prelude.NonEmpty DataSourceSearchFilter
  }
  deriving (SearchDataSources -> SearchDataSources -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: SearchDataSources -> SearchDataSources -> Bool
$c/= :: SearchDataSources -> SearchDataSources -> Bool
== :: SearchDataSources -> SearchDataSources -> Bool
$c== :: SearchDataSources -> SearchDataSources -> Bool
Prelude.Eq, ReadPrec [SearchDataSources]
ReadPrec SearchDataSources
Int -> ReadS SearchDataSources
ReadS [SearchDataSources]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [SearchDataSources]
$creadListPrec :: ReadPrec [SearchDataSources]
readPrec :: ReadPrec SearchDataSources
$creadPrec :: ReadPrec SearchDataSources
readList :: ReadS [SearchDataSources]
$creadList :: ReadS [SearchDataSources]
readsPrec :: Int -> ReadS SearchDataSources
$creadsPrec :: Int -> ReadS SearchDataSources
Prelude.Read, Int -> SearchDataSources -> ShowS
[SearchDataSources] -> ShowS
SearchDataSources -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [SearchDataSources] -> ShowS
$cshowList :: [SearchDataSources] -> ShowS
show :: SearchDataSources -> String
$cshow :: SearchDataSources -> String
showsPrec :: Int -> SearchDataSources -> ShowS
$cshowsPrec :: Int -> SearchDataSources -> ShowS
Prelude.Show, forall x. Rep SearchDataSources x -> SearchDataSources
forall x. SearchDataSources -> Rep SearchDataSources x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep SearchDataSources x -> SearchDataSources
$cfrom :: forall x. SearchDataSources -> Rep SearchDataSources x
Prelude.Generic)

-- |
-- Create a value of 'SearchDataSources' with all optional fields omitted.
--
-- Use <https://hackage.haskell.org/package/generic-lens generic-lens> or <https://hackage.haskell.org/package/optics optics> to modify other optional fields.
--
-- The following record fields are available, with the corresponding lenses provided
-- for backwards compatibility:
--
-- 'maxResults', 'searchDataSources_maxResults' - The maximum number of results to be returned per request.
--
-- 'nextToken', 'searchDataSources_nextToken' - A pagination token that can be used in a subsequent request.
--
-- 'awsAccountId', 'searchDataSources_awsAccountId' - The Amazon Web Services account ID.
--
-- 'filters', 'searchDataSources_filters' - The filters to apply to the search.
newSearchDataSources ::
  -- | 'awsAccountId'
  Prelude.Text ->
  -- | 'filters'
  Prelude.NonEmpty DataSourceSearchFilter ->
  SearchDataSources
newSearchDataSources :: Text -> NonEmpty DataSourceSearchFilter -> SearchDataSources
newSearchDataSources Text
pAwsAccountId_ NonEmpty DataSourceSearchFilter
pFilters_ =
  SearchDataSources'
    { $sel:maxResults:SearchDataSources' :: Maybe Natural
maxResults = forall a. Maybe a
Prelude.Nothing,
      $sel:nextToken:SearchDataSources' :: Maybe Text
nextToken = forall a. Maybe a
Prelude.Nothing,
      $sel:awsAccountId:SearchDataSources' :: Text
awsAccountId = Text
pAwsAccountId_,
      $sel:filters:SearchDataSources' :: NonEmpty DataSourceSearchFilter
filters = forall s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced forall t b. AReview t b -> b -> t
Lens.# NonEmpty DataSourceSearchFilter
pFilters_
    }

-- | The maximum number of results to be returned per request.
searchDataSources_maxResults :: Lens.Lens' SearchDataSources (Prelude.Maybe Prelude.Natural)
searchDataSources_maxResults :: Lens' SearchDataSources (Maybe Natural)
searchDataSources_maxResults = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\SearchDataSources' {Maybe Natural
maxResults :: Maybe Natural
$sel:maxResults:SearchDataSources' :: SearchDataSources -> Maybe Natural
maxResults} -> Maybe Natural
maxResults) (\s :: SearchDataSources
s@SearchDataSources' {} Maybe Natural
a -> SearchDataSources
s {$sel:maxResults:SearchDataSources' :: Maybe Natural
maxResults = Maybe Natural
a} :: SearchDataSources)

-- | A pagination token that can be used in a subsequent request.
searchDataSources_nextToken :: Lens.Lens' SearchDataSources (Prelude.Maybe Prelude.Text)
searchDataSources_nextToken :: Lens' SearchDataSources (Maybe Text)
searchDataSources_nextToken = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\SearchDataSources' {Maybe Text
nextToken :: Maybe Text
$sel:nextToken:SearchDataSources' :: SearchDataSources -> Maybe Text
nextToken} -> Maybe Text
nextToken) (\s :: SearchDataSources
s@SearchDataSources' {} Maybe Text
a -> SearchDataSources
s {$sel:nextToken:SearchDataSources' :: Maybe Text
nextToken = Maybe Text
a} :: SearchDataSources)

-- | The Amazon Web Services account ID.
searchDataSources_awsAccountId :: Lens.Lens' SearchDataSources Prelude.Text
searchDataSources_awsAccountId :: Lens' SearchDataSources Text
searchDataSources_awsAccountId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\SearchDataSources' {Text
awsAccountId :: Text
$sel:awsAccountId:SearchDataSources' :: SearchDataSources -> Text
awsAccountId} -> Text
awsAccountId) (\s :: SearchDataSources
s@SearchDataSources' {} Text
a -> SearchDataSources
s {$sel:awsAccountId:SearchDataSources' :: Text
awsAccountId = Text
a} :: SearchDataSources)

-- | The filters to apply to the search.
searchDataSources_filters :: Lens.Lens' SearchDataSources (Prelude.NonEmpty DataSourceSearchFilter)
searchDataSources_filters :: Lens' SearchDataSources (NonEmpty DataSourceSearchFilter)
searchDataSources_filters = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\SearchDataSources' {NonEmpty DataSourceSearchFilter
filters :: NonEmpty DataSourceSearchFilter
$sel:filters:SearchDataSources' :: SearchDataSources -> NonEmpty DataSourceSearchFilter
filters} -> NonEmpty DataSourceSearchFilter
filters) (\s :: SearchDataSources
s@SearchDataSources' {} NonEmpty DataSourceSearchFilter
a -> SearchDataSources
s {$sel:filters:SearchDataSources' :: NonEmpty DataSourceSearchFilter
filters = NonEmpty DataSourceSearchFilter
a} :: SearchDataSources) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced

instance Core.AWSPager SearchDataSources where
  page :: SearchDataSources
-> AWSResponse SearchDataSources -> Maybe SearchDataSources
page SearchDataSources
rq AWSResponse SearchDataSources
rs
    | forall a. AWSTruncated a => a -> Bool
Core.stop
        ( AWSResponse SearchDataSources
rs
            forall s a. s -> Getting (First a) s a -> Maybe a
Lens.^? Lens' SearchDataSourcesResponse (Maybe Text)
searchDataSourcesResponse_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 SearchDataSources
rs
            forall s a. s -> Getting (First a) s a -> Maybe a
Lens.^? Lens' SearchDataSourcesResponse (Maybe [DataSourceSummary])
searchDataSourcesResponse_dataSourceSummaries
            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.$ SearchDataSources
rq
          forall a b. a -> (a -> b) -> b
Prelude.& Lens' SearchDataSources (Maybe Text)
searchDataSources_nextToken
          forall s t a b. ASetter s t a b -> b -> s -> t
Lens..~ AWSResponse SearchDataSources
rs
          forall s a. s -> Getting (First a) s a -> Maybe a
Lens.^? Lens' SearchDataSourcesResponse (Maybe Text)
searchDataSourcesResponse_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 SearchDataSources where
  type
    AWSResponse SearchDataSources =
      SearchDataSourcesResponse
  request :: (Service -> Service)
-> SearchDataSources -> Request SearchDataSources
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 SearchDataSources
-> ClientResponse ClientBody
-> m (Either
        Error (ClientResponse (AWSResponse SearchDataSources)))
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 [DataSourceSummary]
-> Maybe Text -> Maybe Text -> Int -> SearchDataSourcesResponse
SearchDataSourcesResponse'
            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
"DataSourceSummaries"
                            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.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"RequestId")
            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 SearchDataSources where
  hashWithSalt :: Int -> SearchDataSources -> Int
hashWithSalt Int
_salt SearchDataSources' {Maybe Natural
Maybe Text
NonEmpty DataSourceSearchFilter
Text
filters :: NonEmpty DataSourceSearchFilter
awsAccountId :: Text
nextToken :: Maybe Text
maxResults :: Maybe Natural
$sel:filters:SearchDataSources' :: SearchDataSources -> NonEmpty DataSourceSearchFilter
$sel:awsAccountId:SearchDataSources' :: SearchDataSources -> Text
$sel:nextToken:SearchDataSources' :: SearchDataSources -> Maybe Text
$sel:maxResults:SearchDataSources' :: SearchDataSources -> Maybe Natural
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Natural
maxResults
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
nextToken
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
awsAccountId
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` NonEmpty DataSourceSearchFilter
filters

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

instance Data.ToHeaders SearchDataSources where
  toHeaders :: SearchDataSources -> ResponseHeaders
toHeaders =
    forall a b. a -> b -> a
Prelude.const
      ( forall a. Monoid a => [a] -> a
Prelude.mconcat
          [ HeaderName
"Content-Type"
              forall a. ToHeader a => HeaderName -> a -> ResponseHeaders
Data.=# ( ByteString
"application/x-amz-json-1.0" ::
                          Prelude.ByteString
                      )
          ]
      )

instance Data.ToJSON SearchDataSources where
  toJSON :: SearchDataSources -> Value
toJSON SearchDataSources' {Maybe Natural
Maybe Text
NonEmpty DataSourceSearchFilter
Text
filters :: NonEmpty DataSourceSearchFilter
awsAccountId :: Text
nextToken :: Maybe Text
maxResults :: Maybe Natural
$sel:filters:SearchDataSources' :: SearchDataSources -> NonEmpty DataSourceSearchFilter
$sel:awsAccountId:SearchDataSources' :: SearchDataSources -> Text
$sel:nextToken:SearchDataSources' :: SearchDataSources -> Maybe Text
$sel:maxResults:SearchDataSources' :: SearchDataSources -> Maybe Natural
..} =
    [Pair] -> Value
Data.object
      ( forall a. [Maybe a] -> [a]
Prelude.catMaybes
          [ (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,
            forall a. a -> Maybe a
Prelude.Just (Key
"Filters" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..= NonEmpty DataSourceSearchFilter
filters)
          ]
      )

instance Data.ToPath SearchDataSources where
  toPath :: SearchDataSources -> ByteString
toPath SearchDataSources' {Maybe Natural
Maybe Text
NonEmpty DataSourceSearchFilter
Text
filters :: NonEmpty DataSourceSearchFilter
awsAccountId :: Text
nextToken :: Maybe Text
maxResults :: Maybe Natural
$sel:filters:SearchDataSources' :: SearchDataSources -> NonEmpty DataSourceSearchFilter
$sel:awsAccountId:SearchDataSources' :: SearchDataSources -> Text
$sel:nextToken:SearchDataSources' :: SearchDataSources -> Maybe Text
$sel:maxResults:SearchDataSources' :: SearchDataSources -> Maybe Natural
..} =
    forall a. Monoid a => [a] -> a
Prelude.mconcat
      [ ByteString
"/accounts/",
        forall a. ToByteString a => a -> ByteString
Data.toBS Text
awsAccountId,
        ByteString
"/search/data-sources"
      ]

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

-- | /See:/ 'newSearchDataSourcesResponse' smart constructor.
data SearchDataSourcesResponse = SearchDataSourcesResponse'
  { -- | A @DataSourceSummaries@ object that returns a summary of a data source.
    SearchDataSourcesResponse -> Maybe [DataSourceSummary]
dataSourceSummaries :: Prelude.Maybe [DataSourceSummary],
    -- | A pagination token that can be used in a subsequent request.
    SearchDataSourcesResponse -> Maybe Text
nextToken :: Prelude.Maybe Prelude.Text,
    -- | The Amazon Web Services request ID for this operation.
    SearchDataSourcesResponse -> Maybe Text
requestId :: Prelude.Maybe Prelude.Text,
    -- | The HTTP status of the request.
    SearchDataSourcesResponse -> Int
status :: Prelude.Int
  }
  deriving (SearchDataSourcesResponse -> SearchDataSourcesResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: SearchDataSourcesResponse -> SearchDataSourcesResponse -> Bool
$c/= :: SearchDataSourcesResponse -> SearchDataSourcesResponse -> Bool
== :: SearchDataSourcesResponse -> SearchDataSourcesResponse -> Bool
$c== :: SearchDataSourcesResponse -> SearchDataSourcesResponse -> Bool
Prelude.Eq, ReadPrec [SearchDataSourcesResponse]
ReadPrec SearchDataSourcesResponse
Int -> ReadS SearchDataSourcesResponse
ReadS [SearchDataSourcesResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [SearchDataSourcesResponse]
$creadListPrec :: ReadPrec [SearchDataSourcesResponse]
readPrec :: ReadPrec SearchDataSourcesResponse
$creadPrec :: ReadPrec SearchDataSourcesResponse
readList :: ReadS [SearchDataSourcesResponse]
$creadList :: ReadS [SearchDataSourcesResponse]
readsPrec :: Int -> ReadS SearchDataSourcesResponse
$creadsPrec :: Int -> ReadS SearchDataSourcesResponse
Prelude.Read, Int -> SearchDataSourcesResponse -> ShowS
[SearchDataSourcesResponse] -> ShowS
SearchDataSourcesResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [SearchDataSourcesResponse] -> ShowS
$cshowList :: [SearchDataSourcesResponse] -> ShowS
show :: SearchDataSourcesResponse -> String
$cshow :: SearchDataSourcesResponse -> String
showsPrec :: Int -> SearchDataSourcesResponse -> ShowS
$cshowsPrec :: Int -> SearchDataSourcesResponse -> ShowS
Prelude.Show, forall x.
Rep SearchDataSourcesResponse x -> SearchDataSourcesResponse
forall x.
SearchDataSourcesResponse -> Rep SearchDataSourcesResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep SearchDataSourcesResponse x -> SearchDataSourcesResponse
$cfrom :: forall x.
SearchDataSourcesResponse -> Rep SearchDataSourcesResponse x
Prelude.Generic)

-- |
-- Create a value of 'SearchDataSourcesResponse' 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:
--
-- 'dataSourceSummaries', 'searchDataSourcesResponse_dataSourceSummaries' - A @DataSourceSummaries@ object that returns a summary of a data source.
--
-- 'nextToken', 'searchDataSourcesResponse_nextToken' - A pagination token that can be used in a subsequent request.
--
-- 'requestId', 'searchDataSourcesResponse_requestId' - The Amazon Web Services request ID for this operation.
--
-- 'status', 'searchDataSourcesResponse_status' - The HTTP status of the request.
newSearchDataSourcesResponse ::
  -- | 'status'
  Prelude.Int ->
  SearchDataSourcesResponse
newSearchDataSourcesResponse :: Int -> SearchDataSourcesResponse
newSearchDataSourcesResponse Int
pStatus_ =
  SearchDataSourcesResponse'
    { $sel:dataSourceSummaries:SearchDataSourcesResponse' :: Maybe [DataSourceSummary]
dataSourceSummaries =
        forall a. Maybe a
Prelude.Nothing,
      $sel:nextToken:SearchDataSourcesResponse' :: Maybe Text
nextToken = forall a. Maybe a
Prelude.Nothing,
      $sel:requestId:SearchDataSourcesResponse' :: Maybe Text
requestId = forall a. Maybe a
Prelude.Nothing,
      $sel:status:SearchDataSourcesResponse' :: Int
status = Int
pStatus_
    }

-- | A @DataSourceSummaries@ object that returns a summary of a data source.
searchDataSourcesResponse_dataSourceSummaries :: Lens.Lens' SearchDataSourcesResponse (Prelude.Maybe [DataSourceSummary])
searchDataSourcesResponse_dataSourceSummaries :: Lens' SearchDataSourcesResponse (Maybe [DataSourceSummary])
searchDataSourcesResponse_dataSourceSummaries = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\SearchDataSourcesResponse' {Maybe [DataSourceSummary]
dataSourceSummaries :: Maybe [DataSourceSummary]
$sel:dataSourceSummaries:SearchDataSourcesResponse' :: SearchDataSourcesResponse -> Maybe [DataSourceSummary]
dataSourceSummaries} -> Maybe [DataSourceSummary]
dataSourceSummaries) (\s :: SearchDataSourcesResponse
s@SearchDataSourcesResponse' {} Maybe [DataSourceSummary]
a -> SearchDataSourcesResponse
s {$sel:dataSourceSummaries:SearchDataSourcesResponse' :: Maybe [DataSourceSummary]
dataSourceSummaries = Maybe [DataSourceSummary]
a} :: SearchDataSourcesResponse) 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

-- | A pagination token that can be used in a subsequent request.
searchDataSourcesResponse_nextToken :: Lens.Lens' SearchDataSourcesResponse (Prelude.Maybe Prelude.Text)
searchDataSourcesResponse_nextToken :: Lens' SearchDataSourcesResponse (Maybe Text)
searchDataSourcesResponse_nextToken = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\SearchDataSourcesResponse' {Maybe Text
nextToken :: Maybe Text
$sel:nextToken:SearchDataSourcesResponse' :: SearchDataSourcesResponse -> Maybe Text
nextToken} -> Maybe Text
nextToken) (\s :: SearchDataSourcesResponse
s@SearchDataSourcesResponse' {} Maybe Text
a -> SearchDataSourcesResponse
s {$sel:nextToken:SearchDataSourcesResponse' :: Maybe Text
nextToken = Maybe Text
a} :: SearchDataSourcesResponse)

-- | The Amazon Web Services request ID for this operation.
searchDataSourcesResponse_requestId :: Lens.Lens' SearchDataSourcesResponse (Prelude.Maybe Prelude.Text)
searchDataSourcesResponse_requestId :: Lens' SearchDataSourcesResponse (Maybe Text)
searchDataSourcesResponse_requestId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\SearchDataSourcesResponse' {Maybe Text
requestId :: Maybe Text
$sel:requestId:SearchDataSourcesResponse' :: SearchDataSourcesResponse -> Maybe Text
requestId} -> Maybe Text
requestId) (\s :: SearchDataSourcesResponse
s@SearchDataSourcesResponse' {} Maybe Text
a -> SearchDataSourcesResponse
s {$sel:requestId:SearchDataSourcesResponse' :: Maybe Text
requestId = Maybe Text
a} :: SearchDataSourcesResponse)

-- | The HTTP status of the request.
searchDataSourcesResponse_status :: Lens.Lens' SearchDataSourcesResponse Prelude.Int
searchDataSourcesResponse_status :: Lens' SearchDataSourcesResponse Int
searchDataSourcesResponse_status = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\SearchDataSourcesResponse' {Int
status :: Int
$sel:status:SearchDataSourcesResponse' :: SearchDataSourcesResponse -> Int
status} -> Int
status) (\s :: SearchDataSourcesResponse
s@SearchDataSourcesResponse' {} Int
a -> SearchDataSourcesResponse
s {$sel:status:SearchDataSourcesResponse' :: Int
status = Int
a} :: SearchDataSourcesResponse)

instance Prelude.NFData SearchDataSourcesResponse where
  rnf :: SearchDataSourcesResponse -> ()
rnf SearchDataSourcesResponse' {Int
Maybe [DataSourceSummary]
Maybe Text
status :: Int
requestId :: Maybe Text
nextToken :: Maybe Text
dataSourceSummaries :: Maybe [DataSourceSummary]
$sel:status:SearchDataSourcesResponse' :: SearchDataSourcesResponse -> Int
$sel:requestId:SearchDataSourcesResponse' :: SearchDataSourcesResponse -> Maybe Text
$sel:nextToken:SearchDataSourcesResponse' :: SearchDataSourcesResponse -> Maybe Text
$sel:dataSourceSummaries:SearchDataSourcesResponse' :: SearchDataSourcesResponse -> Maybe [DataSourceSummary]
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe [DataSourceSummary]
dataSourceSummaries
      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 Maybe Text
requestId
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Int
status