{-# 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.LookoutEquipment.ListDataIngestionJobs
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
--
-- Provides a list of all data ingestion jobs, including dataset name and
-- ARN, S3 location of the input data, status, and so on.
module Amazonka.LookoutEquipment.ListDataIngestionJobs
  ( -- * Creating a Request
    ListDataIngestionJobs (..),
    newListDataIngestionJobs,

    -- * Request Lenses
    listDataIngestionJobs_datasetName,
    listDataIngestionJobs_maxResults,
    listDataIngestionJobs_nextToken,
    listDataIngestionJobs_status,

    -- * Destructuring the Response
    ListDataIngestionJobsResponse (..),
    newListDataIngestionJobsResponse,

    -- * Response Lenses
    listDataIngestionJobsResponse_dataIngestionJobSummaries,
    listDataIngestionJobsResponse_nextToken,
    listDataIngestionJobsResponse_httpStatus,
  )
where

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

-- | /See:/ 'newListDataIngestionJobs' smart constructor.
data ListDataIngestionJobs = ListDataIngestionJobs'
  { -- | The name of the dataset being used for the data ingestion job.
    ListDataIngestionJobs -> Maybe Text
datasetName :: Prelude.Maybe Prelude.Text,
    -- | Specifies the maximum number of data ingestion jobs to list.
    ListDataIngestionJobs -> Maybe Natural
maxResults :: Prelude.Maybe Prelude.Natural,
    -- | An opaque pagination token indicating where to continue the listing of
    -- data ingestion jobs.
    ListDataIngestionJobs -> Maybe Text
nextToken :: Prelude.Maybe Prelude.Text,
    -- | Indicates the status of the data ingestion job.
    ListDataIngestionJobs -> Maybe IngestionJobStatus
status :: Prelude.Maybe IngestionJobStatus
  }
  deriving (ListDataIngestionJobs -> ListDataIngestionJobs -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: ListDataIngestionJobs -> ListDataIngestionJobs -> Bool
$c/= :: ListDataIngestionJobs -> ListDataIngestionJobs -> Bool
== :: ListDataIngestionJobs -> ListDataIngestionJobs -> Bool
$c== :: ListDataIngestionJobs -> ListDataIngestionJobs -> Bool
Prelude.Eq, ReadPrec [ListDataIngestionJobs]
ReadPrec ListDataIngestionJobs
Int -> ReadS ListDataIngestionJobs
ReadS [ListDataIngestionJobs]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [ListDataIngestionJobs]
$creadListPrec :: ReadPrec [ListDataIngestionJobs]
readPrec :: ReadPrec ListDataIngestionJobs
$creadPrec :: ReadPrec ListDataIngestionJobs
readList :: ReadS [ListDataIngestionJobs]
$creadList :: ReadS [ListDataIngestionJobs]
readsPrec :: Int -> ReadS ListDataIngestionJobs
$creadsPrec :: Int -> ReadS ListDataIngestionJobs
Prelude.Read, Int -> ListDataIngestionJobs -> ShowS
[ListDataIngestionJobs] -> ShowS
ListDataIngestionJobs -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [ListDataIngestionJobs] -> ShowS
$cshowList :: [ListDataIngestionJobs] -> ShowS
show :: ListDataIngestionJobs -> String
$cshow :: ListDataIngestionJobs -> String
showsPrec :: Int -> ListDataIngestionJobs -> ShowS
$cshowsPrec :: Int -> ListDataIngestionJobs -> ShowS
Prelude.Show, forall x. Rep ListDataIngestionJobs x -> ListDataIngestionJobs
forall x. ListDataIngestionJobs -> Rep ListDataIngestionJobs x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep ListDataIngestionJobs x -> ListDataIngestionJobs
$cfrom :: forall x. ListDataIngestionJobs -> Rep ListDataIngestionJobs x
Prelude.Generic)

-- |
-- Create a value of 'ListDataIngestionJobs' 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:
--
-- 'datasetName', 'listDataIngestionJobs_datasetName' - The name of the dataset being used for the data ingestion job.
--
-- 'maxResults', 'listDataIngestionJobs_maxResults' - Specifies the maximum number of data ingestion jobs to list.
--
-- 'nextToken', 'listDataIngestionJobs_nextToken' - An opaque pagination token indicating where to continue the listing of
-- data ingestion jobs.
--
-- 'status', 'listDataIngestionJobs_status' - Indicates the status of the data ingestion job.
newListDataIngestionJobs ::
  ListDataIngestionJobs
newListDataIngestionJobs :: ListDataIngestionJobs
newListDataIngestionJobs =
  ListDataIngestionJobs'
    { $sel:datasetName:ListDataIngestionJobs' :: Maybe Text
datasetName =
        forall a. Maybe a
Prelude.Nothing,
      $sel:maxResults:ListDataIngestionJobs' :: Maybe Natural
maxResults = forall a. Maybe a
Prelude.Nothing,
      $sel:nextToken:ListDataIngestionJobs' :: Maybe Text
nextToken = forall a. Maybe a
Prelude.Nothing,
      $sel:status:ListDataIngestionJobs' :: Maybe IngestionJobStatus
status = forall a. Maybe a
Prelude.Nothing
    }

-- | The name of the dataset being used for the data ingestion job.
listDataIngestionJobs_datasetName :: Lens.Lens' ListDataIngestionJobs (Prelude.Maybe Prelude.Text)
listDataIngestionJobs_datasetName :: Lens' ListDataIngestionJobs (Maybe Text)
listDataIngestionJobs_datasetName = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListDataIngestionJobs' {Maybe Text
datasetName :: Maybe Text
$sel:datasetName:ListDataIngestionJobs' :: ListDataIngestionJobs -> Maybe Text
datasetName} -> Maybe Text
datasetName) (\s :: ListDataIngestionJobs
s@ListDataIngestionJobs' {} Maybe Text
a -> ListDataIngestionJobs
s {$sel:datasetName:ListDataIngestionJobs' :: Maybe Text
datasetName = Maybe Text
a} :: ListDataIngestionJobs)

-- | Specifies the maximum number of data ingestion jobs to list.
listDataIngestionJobs_maxResults :: Lens.Lens' ListDataIngestionJobs (Prelude.Maybe Prelude.Natural)
listDataIngestionJobs_maxResults :: Lens' ListDataIngestionJobs (Maybe Natural)
listDataIngestionJobs_maxResults = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListDataIngestionJobs' {Maybe Natural
maxResults :: Maybe Natural
$sel:maxResults:ListDataIngestionJobs' :: ListDataIngestionJobs -> Maybe Natural
maxResults} -> Maybe Natural
maxResults) (\s :: ListDataIngestionJobs
s@ListDataIngestionJobs' {} Maybe Natural
a -> ListDataIngestionJobs
s {$sel:maxResults:ListDataIngestionJobs' :: Maybe Natural
maxResults = Maybe Natural
a} :: ListDataIngestionJobs)

-- | An opaque pagination token indicating where to continue the listing of
-- data ingestion jobs.
listDataIngestionJobs_nextToken :: Lens.Lens' ListDataIngestionJobs (Prelude.Maybe Prelude.Text)
listDataIngestionJobs_nextToken :: Lens' ListDataIngestionJobs (Maybe Text)
listDataIngestionJobs_nextToken = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListDataIngestionJobs' {Maybe Text
nextToken :: Maybe Text
$sel:nextToken:ListDataIngestionJobs' :: ListDataIngestionJobs -> Maybe Text
nextToken} -> Maybe Text
nextToken) (\s :: ListDataIngestionJobs
s@ListDataIngestionJobs' {} Maybe Text
a -> ListDataIngestionJobs
s {$sel:nextToken:ListDataIngestionJobs' :: Maybe Text
nextToken = Maybe Text
a} :: ListDataIngestionJobs)

-- | Indicates the status of the data ingestion job.
listDataIngestionJobs_status :: Lens.Lens' ListDataIngestionJobs (Prelude.Maybe IngestionJobStatus)
listDataIngestionJobs_status :: Lens' ListDataIngestionJobs (Maybe IngestionJobStatus)
listDataIngestionJobs_status = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListDataIngestionJobs' {Maybe IngestionJobStatus
status :: Maybe IngestionJobStatus
$sel:status:ListDataIngestionJobs' :: ListDataIngestionJobs -> Maybe IngestionJobStatus
status} -> Maybe IngestionJobStatus
status) (\s :: ListDataIngestionJobs
s@ListDataIngestionJobs' {} Maybe IngestionJobStatus
a -> ListDataIngestionJobs
s {$sel:status:ListDataIngestionJobs' :: Maybe IngestionJobStatus
status = Maybe IngestionJobStatus
a} :: ListDataIngestionJobs)

instance Core.AWSRequest ListDataIngestionJobs where
  type
    AWSResponse ListDataIngestionJobs =
      ListDataIngestionJobsResponse
  request :: (Service -> Service)
-> ListDataIngestionJobs -> Request ListDataIngestionJobs
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 ListDataIngestionJobs
-> ClientResponse ClientBody
-> m (Either
        Error (ClientResponse (AWSResponse ListDataIngestionJobs)))
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 [DataIngestionJobSummary]
-> Maybe Text -> Int -> ListDataIngestionJobsResponse
ListDataIngestionJobsResponse'
            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
"DataIngestionJobSummaries"
                            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 ListDataIngestionJobs where
  hashWithSalt :: Int -> ListDataIngestionJobs -> Int
hashWithSalt Int
_salt ListDataIngestionJobs' {Maybe Natural
Maybe Text
Maybe IngestionJobStatus
status :: Maybe IngestionJobStatus
nextToken :: Maybe Text
maxResults :: Maybe Natural
datasetName :: Maybe Text
$sel:status:ListDataIngestionJobs' :: ListDataIngestionJobs -> Maybe IngestionJobStatus
$sel:nextToken:ListDataIngestionJobs' :: ListDataIngestionJobs -> Maybe Text
$sel:maxResults:ListDataIngestionJobs' :: ListDataIngestionJobs -> Maybe Natural
$sel:datasetName:ListDataIngestionJobs' :: ListDataIngestionJobs -> Maybe Text
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
datasetName
      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` Maybe IngestionJobStatus
status

instance Prelude.NFData ListDataIngestionJobs where
  rnf :: ListDataIngestionJobs -> ()
rnf ListDataIngestionJobs' {Maybe Natural
Maybe Text
Maybe IngestionJobStatus
status :: Maybe IngestionJobStatus
nextToken :: Maybe Text
maxResults :: Maybe Natural
datasetName :: Maybe Text
$sel:status:ListDataIngestionJobs' :: ListDataIngestionJobs -> Maybe IngestionJobStatus
$sel:nextToken:ListDataIngestionJobs' :: ListDataIngestionJobs -> Maybe Text
$sel:maxResults:ListDataIngestionJobs' :: ListDataIngestionJobs -> Maybe Natural
$sel:datasetName:ListDataIngestionJobs' :: ListDataIngestionJobs -> Maybe Text
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
datasetName
      seq :: forall a b. a -> b -> b
`Prelude.seq` 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 Maybe IngestionJobStatus
status

instance Data.ToHeaders ListDataIngestionJobs where
  toHeaders :: ListDataIngestionJobs -> 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
"AWSLookoutEquipmentFrontendService.ListDataIngestionJobs" ::
                          Prelude.ByteString
                      ),
            HeaderName
"Content-Type"
              forall a. ToHeader a => HeaderName -> a -> ResponseHeaders
Data.=# ( ByteString
"application/x-amz-json-1.0" ::
                          Prelude.ByteString
                      )
          ]
      )

instance Data.ToJSON ListDataIngestionJobs where
  toJSON :: ListDataIngestionJobs -> Value
toJSON ListDataIngestionJobs' {Maybe Natural
Maybe Text
Maybe IngestionJobStatus
status :: Maybe IngestionJobStatus
nextToken :: Maybe Text
maxResults :: Maybe Natural
datasetName :: Maybe Text
$sel:status:ListDataIngestionJobs' :: ListDataIngestionJobs -> Maybe IngestionJobStatus
$sel:nextToken:ListDataIngestionJobs' :: ListDataIngestionJobs -> Maybe Text
$sel:maxResults:ListDataIngestionJobs' :: ListDataIngestionJobs -> Maybe Natural
$sel:datasetName:ListDataIngestionJobs' :: ListDataIngestionJobs -> Maybe Text
..} =
    [Pair] -> Value
Data.object
      ( forall a. [Maybe a] -> [a]
Prelude.catMaybes
          [ (Key
"DatasetName" 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
datasetName,
            (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,
            (Key
"Status" 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 IngestionJobStatus
status
          ]
      )

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

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

-- | /See:/ 'newListDataIngestionJobsResponse' smart constructor.
data ListDataIngestionJobsResponse = ListDataIngestionJobsResponse'
  { -- | Specifies information about the specific data ingestion job, including
    -- dataset name and status.
    ListDataIngestionJobsResponse -> Maybe [DataIngestionJobSummary]
dataIngestionJobSummaries :: Prelude.Maybe [DataIngestionJobSummary],
    -- | An opaque pagination token indicating where to continue the listing of
    -- data ingestion jobs.
    ListDataIngestionJobsResponse -> Maybe Text
nextToken :: Prelude.Maybe Prelude.Text,
    -- | The response's http status code.
    ListDataIngestionJobsResponse -> Int
httpStatus :: Prelude.Int
  }
  deriving (ListDataIngestionJobsResponse
-> ListDataIngestionJobsResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: ListDataIngestionJobsResponse
-> ListDataIngestionJobsResponse -> Bool
$c/= :: ListDataIngestionJobsResponse
-> ListDataIngestionJobsResponse -> Bool
== :: ListDataIngestionJobsResponse
-> ListDataIngestionJobsResponse -> Bool
$c== :: ListDataIngestionJobsResponse
-> ListDataIngestionJobsResponse -> Bool
Prelude.Eq, ReadPrec [ListDataIngestionJobsResponse]
ReadPrec ListDataIngestionJobsResponse
Int -> ReadS ListDataIngestionJobsResponse
ReadS [ListDataIngestionJobsResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [ListDataIngestionJobsResponse]
$creadListPrec :: ReadPrec [ListDataIngestionJobsResponse]
readPrec :: ReadPrec ListDataIngestionJobsResponse
$creadPrec :: ReadPrec ListDataIngestionJobsResponse
readList :: ReadS [ListDataIngestionJobsResponse]
$creadList :: ReadS [ListDataIngestionJobsResponse]
readsPrec :: Int -> ReadS ListDataIngestionJobsResponse
$creadsPrec :: Int -> ReadS ListDataIngestionJobsResponse
Prelude.Read, Int -> ListDataIngestionJobsResponse -> ShowS
[ListDataIngestionJobsResponse] -> ShowS
ListDataIngestionJobsResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [ListDataIngestionJobsResponse] -> ShowS
$cshowList :: [ListDataIngestionJobsResponse] -> ShowS
show :: ListDataIngestionJobsResponse -> String
$cshow :: ListDataIngestionJobsResponse -> String
showsPrec :: Int -> ListDataIngestionJobsResponse -> ShowS
$cshowsPrec :: Int -> ListDataIngestionJobsResponse -> ShowS
Prelude.Show, forall x.
Rep ListDataIngestionJobsResponse x
-> ListDataIngestionJobsResponse
forall x.
ListDataIngestionJobsResponse
-> Rep ListDataIngestionJobsResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep ListDataIngestionJobsResponse x
-> ListDataIngestionJobsResponse
$cfrom :: forall x.
ListDataIngestionJobsResponse
-> Rep ListDataIngestionJobsResponse x
Prelude.Generic)

-- |
-- Create a value of 'ListDataIngestionJobsResponse' 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:
--
-- 'dataIngestionJobSummaries', 'listDataIngestionJobsResponse_dataIngestionJobSummaries' - Specifies information about the specific data ingestion job, including
-- dataset name and status.
--
-- 'nextToken', 'listDataIngestionJobsResponse_nextToken' - An opaque pagination token indicating where to continue the listing of
-- data ingestion jobs.
--
-- 'httpStatus', 'listDataIngestionJobsResponse_httpStatus' - The response's http status code.
newListDataIngestionJobsResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  ListDataIngestionJobsResponse
newListDataIngestionJobsResponse :: Int -> ListDataIngestionJobsResponse
newListDataIngestionJobsResponse Int
pHttpStatus_ =
  ListDataIngestionJobsResponse'
    { $sel:dataIngestionJobSummaries:ListDataIngestionJobsResponse' :: Maybe [DataIngestionJobSummary]
dataIngestionJobSummaries =
        forall a. Maybe a
Prelude.Nothing,
      $sel:nextToken:ListDataIngestionJobsResponse' :: Maybe Text
nextToken = forall a. Maybe a
Prelude.Nothing,
      $sel:httpStatus:ListDataIngestionJobsResponse' :: Int
httpStatus = Int
pHttpStatus_
    }

-- | Specifies information about the specific data ingestion job, including
-- dataset name and status.
listDataIngestionJobsResponse_dataIngestionJobSummaries :: Lens.Lens' ListDataIngestionJobsResponse (Prelude.Maybe [DataIngestionJobSummary])
listDataIngestionJobsResponse_dataIngestionJobSummaries :: Lens'
  ListDataIngestionJobsResponse (Maybe [DataIngestionJobSummary])
listDataIngestionJobsResponse_dataIngestionJobSummaries = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListDataIngestionJobsResponse' {Maybe [DataIngestionJobSummary]
dataIngestionJobSummaries :: Maybe [DataIngestionJobSummary]
$sel:dataIngestionJobSummaries:ListDataIngestionJobsResponse' :: ListDataIngestionJobsResponse -> Maybe [DataIngestionJobSummary]
dataIngestionJobSummaries} -> Maybe [DataIngestionJobSummary]
dataIngestionJobSummaries) (\s :: ListDataIngestionJobsResponse
s@ListDataIngestionJobsResponse' {} Maybe [DataIngestionJobSummary]
a -> ListDataIngestionJobsResponse
s {$sel:dataIngestionJobSummaries:ListDataIngestionJobsResponse' :: Maybe [DataIngestionJobSummary]
dataIngestionJobSummaries = Maybe [DataIngestionJobSummary]
a} :: ListDataIngestionJobsResponse) 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 opaque pagination token indicating where to continue the listing of
-- data ingestion jobs.
listDataIngestionJobsResponse_nextToken :: Lens.Lens' ListDataIngestionJobsResponse (Prelude.Maybe Prelude.Text)
listDataIngestionJobsResponse_nextToken :: Lens' ListDataIngestionJobsResponse (Maybe Text)
listDataIngestionJobsResponse_nextToken = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListDataIngestionJobsResponse' {Maybe Text
nextToken :: Maybe Text
$sel:nextToken:ListDataIngestionJobsResponse' :: ListDataIngestionJobsResponse -> Maybe Text
nextToken} -> Maybe Text
nextToken) (\s :: ListDataIngestionJobsResponse
s@ListDataIngestionJobsResponse' {} Maybe Text
a -> ListDataIngestionJobsResponse
s {$sel:nextToken:ListDataIngestionJobsResponse' :: Maybe Text
nextToken = Maybe Text
a} :: ListDataIngestionJobsResponse)

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

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