{-# 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.SageMakerGeoSpatial.SearchRasterDataCollection
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
--
-- Allows you run image query on a specific raster data collection to get a
-- list of the satellite imagery matching the selected filters.
module Amazonka.SageMakerGeoSpatial.SearchRasterDataCollection
  ( -- * Creating a Request
    SearchRasterDataCollection (..),
    newSearchRasterDataCollection,

    -- * Request Lenses
    searchRasterDataCollection_nextToken,
    searchRasterDataCollection_arn,
    searchRasterDataCollection_rasterDataCollectionQuery,

    -- * Destructuring the Response
    SearchRasterDataCollectionResponse (..),
    newSearchRasterDataCollectionResponse,

    -- * Response Lenses
    searchRasterDataCollectionResponse_items,
    searchRasterDataCollectionResponse_nextToken,
    searchRasterDataCollectionResponse_httpStatus,
    searchRasterDataCollectionResponse_approximateResultCount,
  )
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 qualified Amazonka.Request as Request
import qualified Amazonka.Response as Response
import Amazonka.SageMakerGeoSpatial.Types

-- | /See:/ 'newSearchRasterDataCollection' smart constructor.
data SearchRasterDataCollection = SearchRasterDataCollection'
  { -- | If the previous response was truncated, you receive this token. Use it
    -- in your next request to receive the next set of results.
    SearchRasterDataCollection -> Maybe (Sensitive Text)
nextToken :: Prelude.Maybe (Data.Sensitive Prelude.Text),
    -- | The Amazon Resource Name (ARN) of the raster data collection.
    SearchRasterDataCollection -> Text
arn :: Prelude.Text,
    SearchRasterDataCollection
-> RasterDataCollectionQueryWithBandFilterInput
rasterDataCollectionQuery :: RasterDataCollectionQueryWithBandFilterInput
  }
  deriving (SearchRasterDataCollection -> SearchRasterDataCollection -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: SearchRasterDataCollection -> SearchRasterDataCollection -> Bool
$c/= :: SearchRasterDataCollection -> SearchRasterDataCollection -> Bool
== :: SearchRasterDataCollection -> SearchRasterDataCollection -> Bool
$c== :: SearchRasterDataCollection -> SearchRasterDataCollection -> Bool
Prelude.Eq, Int -> SearchRasterDataCollection -> ShowS
[SearchRasterDataCollection] -> ShowS
SearchRasterDataCollection -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [SearchRasterDataCollection] -> ShowS
$cshowList :: [SearchRasterDataCollection] -> ShowS
show :: SearchRasterDataCollection -> String
$cshow :: SearchRasterDataCollection -> String
showsPrec :: Int -> SearchRasterDataCollection -> ShowS
$cshowsPrec :: Int -> SearchRasterDataCollection -> ShowS
Prelude.Show, forall x.
Rep SearchRasterDataCollection x -> SearchRasterDataCollection
forall x.
SearchRasterDataCollection -> Rep SearchRasterDataCollection x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep SearchRasterDataCollection x -> SearchRasterDataCollection
$cfrom :: forall x.
SearchRasterDataCollection -> Rep SearchRasterDataCollection x
Prelude.Generic)

-- |
-- Create a value of 'SearchRasterDataCollection' 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:
--
-- 'nextToken', 'searchRasterDataCollection_nextToken' - If the previous response was truncated, you receive this token. Use it
-- in your next request to receive the next set of results.
--
-- 'arn', 'searchRasterDataCollection_arn' - The Amazon Resource Name (ARN) of the raster data collection.
--
-- 'rasterDataCollectionQuery', 'searchRasterDataCollection_rasterDataCollectionQuery' -
newSearchRasterDataCollection ::
  -- | 'arn'
  Prelude.Text ->
  -- | 'rasterDataCollectionQuery'
  RasterDataCollectionQueryWithBandFilterInput ->
  SearchRasterDataCollection
newSearchRasterDataCollection :: Text
-> RasterDataCollectionQueryWithBandFilterInput
-> SearchRasterDataCollection
newSearchRasterDataCollection
  Text
pArn_
  RasterDataCollectionQueryWithBandFilterInput
pRasterDataCollectionQuery_ =
    SearchRasterDataCollection'
      { $sel:nextToken:SearchRasterDataCollection' :: Maybe (Sensitive Text)
nextToken =
          forall a. Maybe a
Prelude.Nothing,
        $sel:arn:SearchRasterDataCollection' :: Text
arn = Text
pArn_,
        $sel:rasterDataCollectionQuery:SearchRasterDataCollection' :: RasterDataCollectionQueryWithBandFilterInput
rasterDataCollectionQuery =
          RasterDataCollectionQueryWithBandFilterInput
pRasterDataCollectionQuery_
      }

-- | If the previous response was truncated, you receive this token. Use it
-- in your next request to receive the next set of results.
searchRasterDataCollection_nextToken :: Lens.Lens' SearchRasterDataCollection (Prelude.Maybe Prelude.Text)
searchRasterDataCollection_nextToken :: Lens' SearchRasterDataCollection (Maybe Text)
searchRasterDataCollection_nextToken = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\SearchRasterDataCollection' {Maybe (Sensitive Text)
nextToken :: Maybe (Sensitive Text)
$sel:nextToken:SearchRasterDataCollection' :: SearchRasterDataCollection -> Maybe (Sensitive Text)
nextToken} -> Maybe (Sensitive Text)
nextToken) (\s :: SearchRasterDataCollection
s@SearchRasterDataCollection' {} Maybe (Sensitive Text)
a -> SearchRasterDataCollection
s {$sel:nextToken:SearchRasterDataCollection' :: Maybe (Sensitive Text)
nextToken = Maybe (Sensitive Text)
a} :: SearchRasterDataCollection) 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 a. Iso' (Sensitive a) a
Data._Sensitive

-- | The Amazon Resource Name (ARN) of the raster data collection.
searchRasterDataCollection_arn :: Lens.Lens' SearchRasterDataCollection Prelude.Text
searchRasterDataCollection_arn :: Lens' SearchRasterDataCollection Text
searchRasterDataCollection_arn = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\SearchRasterDataCollection' {Text
arn :: Text
$sel:arn:SearchRasterDataCollection' :: SearchRasterDataCollection -> Text
arn} -> Text
arn) (\s :: SearchRasterDataCollection
s@SearchRasterDataCollection' {} Text
a -> SearchRasterDataCollection
s {$sel:arn:SearchRasterDataCollection' :: Text
arn = Text
a} :: SearchRasterDataCollection)

searchRasterDataCollection_rasterDataCollectionQuery :: Lens.Lens' SearchRasterDataCollection RasterDataCollectionQueryWithBandFilterInput
searchRasterDataCollection_rasterDataCollectionQuery :: Lens'
  SearchRasterDataCollection
  RasterDataCollectionQueryWithBandFilterInput
searchRasterDataCollection_rasterDataCollectionQuery = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\SearchRasterDataCollection' {RasterDataCollectionQueryWithBandFilterInput
rasterDataCollectionQuery :: RasterDataCollectionQueryWithBandFilterInput
$sel:rasterDataCollectionQuery:SearchRasterDataCollection' :: SearchRasterDataCollection
-> RasterDataCollectionQueryWithBandFilterInput
rasterDataCollectionQuery} -> RasterDataCollectionQueryWithBandFilterInput
rasterDataCollectionQuery) (\s :: SearchRasterDataCollection
s@SearchRasterDataCollection' {} RasterDataCollectionQueryWithBandFilterInput
a -> SearchRasterDataCollection
s {$sel:rasterDataCollectionQuery:SearchRasterDataCollection' :: RasterDataCollectionQueryWithBandFilterInput
rasterDataCollectionQuery = RasterDataCollectionQueryWithBandFilterInput
a} :: SearchRasterDataCollection)

instance Core.AWSRequest SearchRasterDataCollection where
  type
    AWSResponse SearchRasterDataCollection =
      SearchRasterDataCollectionResponse
  request :: (Service -> Service)
-> SearchRasterDataCollection -> Request SearchRasterDataCollection
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 SearchRasterDataCollection
-> ClientResponse ClientBody
-> m (Either
        Error (ClientResponse (AWSResponse SearchRasterDataCollection)))
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 [ItemSource]
-> Maybe (Sensitive Text)
-> Int
-> Int
-> SearchRasterDataCollectionResponse
SearchRasterDataCollectionResponse'
            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
"Items" 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))
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String a
Data..:> Key
"ApproximateResultCount")
      )

instance Prelude.Hashable SearchRasterDataCollection where
  hashWithSalt :: Int -> SearchRasterDataCollection -> Int
hashWithSalt Int
_salt SearchRasterDataCollection' {Maybe (Sensitive Text)
Text
RasterDataCollectionQueryWithBandFilterInput
rasterDataCollectionQuery :: RasterDataCollectionQueryWithBandFilterInput
arn :: Text
nextToken :: Maybe (Sensitive Text)
$sel:rasterDataCollectionQuery:SearchRasterDataCollection' :: SearchRasterDataCollection
-> RasterDataCollectionQueryWithBandFilterInput
$sel:arn:SearchRasterDataCollection' :: SearchRasterDataCollection -> Text
$sel:nextToken:SearchRasterDataCollection' :: SearchRasterDataCollection -> Maybe (Sensitive Text)
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe (Sensitive Text)
nextToken
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
arn
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` RasterDataCollectionQueryWithBandFilterInput
rasterDataCollectionQuery

instance Prelude.NFData SearchRasterDataCollection where
  rnf :: SearchRasterDataCollection -> ()
rnf SearchRasterDataCollection' {Maybe (Sensitive Text)
Text
RasterDataCollectionQueryWithBandFilterInput
rasterDataCollectionQuery :: RasterDataCollectionQueryWithBandFilterInput
arn :: Text
nextToken :: Maybe (Sensitive Text)
$sel:rasterDataCollectionQuery:SearchRasterDataCollection' :: SearchRasterDataCollection
-> RasterDataCollectionQueryWithBandFilterInput
$sel:arn:SearchRasterDataCollection' :: SearchRasterDataCollection -> Text
$sel:nextToken:SearchRasterDataCollection' :: SearchRasterDataCollection -> Maybe (Sensitive Text)
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe (Sensitive Text)
nextToken
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Text
arn
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf RasterDataCollectionQueryWithBandFilterInput
rasterDataCollectionQuery

instance Data.ToHeaders SearchRasterDataCollection where
  toHeaders :: SearchRasterDataCollection -> 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.1" ::
                          Prelude.ByteString
                      )
          ]
      )

instance Data.ToJSON SearchRasterDataCollection where
  toJSON :: SearchRasterDataCollection -> Value
toJSON SearchRasterDataCollection' {Maybe (Sensitive Text)
Text
RasterDataCollectionQueryWithBandFilterInput
rasterDataCollectionQuery :: RasterDataCollectionQueryWithBandFilterInput
arn :: Text
nextToken :: Maybe (Sensitive Text)
$sel:rasterDataCollectionQuery:SearchRasterDataCollection' :: SearchRasterDataCollection
-> RasterDataCollectionQueryWithBandFilterInput
$sel:arn:SearchRasterDataCollection' :: SearchRasterDataCollection -> Text
$sel:nextToken:SearchRasterDataCollection' :: SearchRasterDataCollection -> Maybe (Sensitive Text)
..} =
    [Pair] -> Value
Data.object
      ( forall a. [Maybe a] -> [a]
Prelude.catMaybes
          [ (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 (Sensitive Text)
nextToken,
            forall a. a -> Maybe a
Prelude.Just (Key
"Arn" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..= Text
arn),
            forall a. a -> Maybe a
Prelude.Just
              ( Key
"RasterDataCollectionQuery"
                  forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..= RasterDataCollectionQueryWithBandFilterInput
rasterDataCollectionQuery
              )
          ]
      )

instance Data.ToPath SearchRasterDataCollection where
  toPath :: SearchRasterDataCollection -> ByteString
toPath =
    forall a b. a -> b -> a
Prelude.const ByteString
"/search-raster-data-collection"

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

-- | /See:/ 'newSearchRasterDataCollectionResponse' smart constructor.
data SearchRasterDataCollectionResponse = SearchRasterDataCollectionResponse'
  { SearchRasterDataCollectionResponse -> Maybe [ItemSource]
items :: Prelude.Maybe [ItemSource],
    -- | If the previous response was truncated, you receive this token. Use it
    -- in your next request to receive the next set of results.
    SearchRasterDataCollectionResponse -> Maybe (Sensitive Text)
nextToken :: Prelude.Maybe (Data.Sensitive Prelude.Text),
    -- | The response's http status code.
    SearchRasterDataCollectionResponse -> Int
httpStatus :: Prelude.Int,
    SearchRasterDataCollectionResponse -> Int
approximateResultCount :: Prelude.Int
  }
  deriving (SearchRasterDataCollectionResponse
-> SearchRasterDataCollectionResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: SearchRasterDataCollectionResponse
-> SearchRasterDataCollectionResponse -> Bool
$c/= :: SearchRasterDataCollectionResponse
-> SearchRasterDataCollectionResponse -> Bool
== :: SearchRasterDataCollectionResponse
-> SearchRasterDataCollectionResponse -> Bool
$c== :: SearchRasterDataCollectionResponse
-> SearchRasterDataCollectionResponse -> Bool
Prelude.Eq, Int -> SearchRasterDataCollectionResponse -> ShowS
[SearchRasterDataCollectionResponse] -> ShowS
SearchRasterDataCollectionResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [SearchRasterDataCollectionResponse] -> ShowS
$cshowList :: [SearchRasterDataCollectionResponse] -> ShowS
show :: SearchRasterDataCollectionResponse -> String
$cshow :: SearchRasterDataCollectionResponse -> String
showsPrec :: Int -> SearchRasterDataCollectionResponse -> ShowS
$cshowsPrec :: Int -> SearchRasterDataCollectionResponse -> ShowS
Prelude.Show, forall x.
Rep SearchRasterDataCollectionResponse x
-> SearchRasterDataCollectionResponse
forall x.
SearchRasterDataCollectionResponse
-> Rep SearchRasterDataCollectionResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep SearchRasterDataCollectionResponse x
-> SearchRasterDataCollectionResponse
$cfrom :: forall x.
SearchRasterDataCollectionResponse
-> Rep SearchRasterDataCollectionResponse x
Prelude.Generic)

-- |
-- Create a value of 'SearchRasterDataCollectionResponse' 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:
--
-- 'items', 'searchRasterDataCollectionResponse_items' -
--
-- 'nextToken', 'searchRasterDataCollectionResponse_nextToken' - If the previous response was truncated, you receive this token. Use it
-- in your next request to receive the next set of results.
--
-- 'httpStatus', 'searchRasterDataCollectionResponse_httpStatus' - The response's http status code.
--
-- 'approximateResultCount', 'searchRasterDataCollectionResponse_approximateResultCount' -
newSearchRasterDataCollectionResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  -- | 'approximateResultCount'
  Prelude.Int ->
  SearchRasterDataCollectionResponse
newSearchRasterDataCollectionResponse :: Int -> Int -> SearchRasterDataCollectionResponse
newSearchRasterDataCollectionResponse
  Int
pHttpStatus_
  Int
pApproximateResultCount_ =
    SearchRasterDataCollectionResponse'
      { $sel:items:SearchRasterDataCollectionResponse' :: Maybe [ItemSource]
items =
          forall a. Maybe a
Prelude.Nothing,
        $sel:nextToken:SearchRasterDataCollectionResponse' :: Maybe (Sensitive Text)
nextToken = forall a. Maybe a
Prelude.Nothing,
        $sel:httpStatus:SearchRasterDataCollectionResponse' :: Int
httpStatus = Int
pHttpStatus_,
        $sel:approximateResultCount:SearchRasterDataCollectionResponse' :: Int
approximateResultCount =
          Int
pApproximateResultCount_
      }

searchRasterDataCollectionResponse_items :: Lens.Lens' SearchRasterDataCollectionResponse (Prelude.Maybe [ItemSource])
searchRasterDataCollectionResponse_items :: Lens' SearchRasterDataCollectionResponse (Maybe [ItemSource])
searchRasterDataCollectionResponse_items = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\SearchRasterDataCollectionResponse' {Maybe [ItemSource]
items :: Maybe [ItemSource]
$sel:items:SearchRasterDataCollectionResponse' :: SearchRasterDataCollectionResponse -> Maybe [ItemSource]
items} -> Maybe [ItemSource]
items) (\s :: SearchRasterDataCollectionResponse
s@SearchRasterDataCollectionResponse' {} Maybe [ItemSource]
a -> SearchRasterDataCollectionResponse
s {$sel:items:SearchRasterDataCollectionResponse' :: Maybe [ItemSource]
items = Maybe [ItemSource]
a} :: SearchRasterDataCollectionResponse) 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 the previous response was truncated, you receive this token. Use it
-- in your next request to receive the next set of results.
searchRasterDataCollectionResponse_nextToken :: Lens.Lens' SearchRasterDataCollectionResponse (Prelude.Maybe Prelude.Text)
searchRasterDataCollectionResponse_nextToken :: Lens' SearchRasterDataCollectionResponse (Maybe Text)
searchRasterDataCollectionResponse_nextToken = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\SearchRasterDataCollectionResponse' {Maybe (Sensitive Text)
nextToken :: Maybe (Sensitive Text)
$sel:nextToken:SearchRasterDataCollectionResponse' :: SearchRasterDataCollectionResponse -> Maybe (Sensitive Text)
nextToken} -> Maybe (Sensitive Text)
nextToken) (\s :: SearchRasterDataCollectionResponse
s@SearchRasterDataCollectionResponse' {} Maybe (Sensitive Text)
a -> SearchRasterDataCollectionResponse
s {$sel:nextToken:SearchRasterDataCollectionResponse' :: Maybe (Sensitive Text)
nextToken = Maybe (Sensitive Text)
a} :: SearchRasterDataCollectionResponse) 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 a. Iso' (Sensitive a) a
Data._Sensitive

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

searchRasterDataCollectionResponse_approximateResultCount :: Lens.Lens' SearchRasterDataCollectionResponse Prelude.Int
searchRasterDataCollectionResponse_approximateResultCount :: Lens' SearchRasterDataCollectionResponse Int
searchRasterDataCollectionResponse_approximateResultCount = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\SearchRasterDataCollectionResponse' {Int
approximateResultCount :: Int
$sel:approximateResultCount:SearchRasterDataCollectionResponse' :: SearchRasterDataCollectionResponse -> Int
approximateResultCount} -> Int
approximateResultCount) (\s :: SearchRasterDataCollectionResponse
s@SearchRasterDataCollectionResponse' {} Int
a -> SearchRasterDataCollectionResponse
s {$sel:approximateResultCount:SearchRasterDataCollectionResponse' :: Int
approximateResultCount = Int
a} :: SearchRasterDataCollectionResponse)

instance
  Prelude.NFData
    SearchRasterDataCollectionResponse
  where
  rnf :: SearchRasterDataCollectionResponse -> ()
rnf SearchRasterDataCollectionResponse' {Int
Maybe [ItemSource]
Maybe (Sensitive Text)
approximateResultCount :: Int
httpStatus :: Int
nextToken :: Maybe (Sensitive Text)
items :: Maybe [ItemSource]
$sel:approximateResultCount:SearchRasterDataCollectionResponse' :: SearchRasterDataCollectionResponse -> Int
$sel:httpStatus:SearchRasterDataCollectionResponse' :: SearchRasterDataCollectionResponse -> Int
$sel:nextToken:SearchRasterDataCollectionResponse' :: SearchRasterDataCollectionResponse -> Maybe (Sensitive Text)
$sel:items:SearchRasterDataCollectionResponse' :: SearchRasterDataCollectionResponse -> Maybe [ItemSource]
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe [ItemSource]
items
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe (Sensitive Text)
nextToken
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Int
httpStatus
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Int
approximateResultCount