{-# 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.FraudDetector.GetBatchPredictionJobs
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
--
-- Gets all batch prediction jobs or a specific job if you specify a job
-- ID. This is a paginated API. If you provide a null maxResults, this
-- action retrieves a maximum of 50 records per page. If you provide a
-- maxResults, the value must be between 1 and 50. To get the next page
-- results, provide the pagination token from the
-- GetBatchPredictionJobsResponse as part of your request. A null
-- pagination token fetches the records from the beginning.
module Amazonka.FraudDetector.GetBatchPredictionJobs
  ( -- * Creating a Request
    GetBatchPredictionJobs (..),
    newGetBatchPredictionJobs,

    -- * Request Lenses
    getBatchPredictionJobs_jobId,
    getBatchPredictionJobs_maxResults,
    getBatchPredictionJobs_nextToken,

    -- * Destructuring the Response
    GetBatchPredictionJobsResponse (..),
    newGetBatchPredictionJobsResponse,

    -- * Response Lenses
    getBatchPredictionJobsResponse_batchPredictions,
    getBatchPredictionJobsResponse_nextToken,
    getBatchPredictionJobsResponse_httpStatus,
  )
where

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

-- | /See:/ 'newGetBatchPredictionJobs' smart constructor.
data GetBatchPredictionJobs = GetBatchPredictionJobs'
  { -- | The batch prediction job for which to get the details.
    GetBatchPredictionJobs -> Maybe Text
jobId :: Prelude.Maybe Prelude.Text,
    -- | The maximum number of objects to return for the request.
    GetBatchPredictionJobs -> Maybe Natural
maxResults :: Prelude.Maybe Prelude.Natural,
    -- | The next token from the previous request.
    GetBatchPredictionJobs -> Maybe Text
nextToken :: Prelude.Maybe Prelude.Text
  }
  deriving (GetBatchPredictionJobs -> GetBatchPredictionJobs -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: GetBatchPredictionJobs -> GetBatchPredictionJobs -> Bool
$c/= :: GetBatchPredictionJobs -> GetBatchPredictionJobs -> Bool
== :: GetBatchPredictionJobs -> GetBatchPredictionJobs -> Bool
$c== :: GetBatchPredictionJobs -> GetBatchPredictionJobs -> Bool
Prelude.Eq, ReadPrec [GetBatchPredictionJobs]
ReadPrec GetBatchPredictionJobs
Int -> ReadS GetBatchPredictionJobs
ReadS [GetBatchPredictionJobs]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [GetBatchPredictionJobs]
$creadListPrec :: ReadPrec [GetBatchPredictionJobs]
readPrec :: ReadPrec GetBatchPredictionJobs
$creadPrec :: ReadPrec GetBatchPredictionJobs
readList :: ReadS [GetBatchPredictionJobs]
$creadList :: ReadS [GetBatchPredictionJobs]
readsPrec :: Int -> ReadS GetBatchPredictionJobs
$creadsPrec :: Int -> ReadS GetBatchPredictionJobs
Prelude.Read, Int -> GetBatchPredictionJobs -> ShowS
[GetBatchPredictionJobs] -> ShowS
GetBatchPredictionJobs -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [GetBatchPredictionJobs] -> ShowS
$cshowList :: [GetBatchPredictionJobs] -> ShowS
show :: GetBatchPredictionJobs -> String
$cshow :: GetBatchPredictionJobs -> String
showsPrec :: Int -> GetBatchPredictionJobs -> ShowS
$cshowsPrec :: Int -> GetBatchPredictionJobs -> ShowS
Prelude.Show, forall x. Rep GetBatchPredictionJobs x -> GetBatchPredictionJobs
forall x. GetBatchPredictionJobs -> Rep GetBatchPredictionJobs x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep GetBatchPredictionJobs x -> GetBatchPredictionJobs
$cfrom :: forall x. GetBatchPredictionJobs -> Rep GetBatchPredictionJobs x
Prelude.Generic)

-- |
-- Create a value of 'GetBatchPredictionJobs' 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:
--
-- 'jobId', 'getBatchPredictionJobs_jobId' - The batch prediction job for which to get the details.
--
-- 'maxResults', 'getBatchPredictionJobs_maxResults' - The maximum number of objects to return for the request.
--
-- 'nextToken', 'getBatchPredictionJobs_nextToken' - The next token from the previous request.
newGetBatchPredictionJobs ::
  GetBatchPredictionJobs
newGetBatchPredictionJobs :: GetBatchPredictionJobs
newGetBatchPredictionJobs =
  GetBatchPredictionJobs'
    { $sel:jobId:GetBatchPredictionJobs' :: Maybe Text
jobId = forall a. Maybe a
Prelude.Nothing,
      $sel:maxResults:GetBatchPredictionJobs' :: Maybe Natural
maxResults = forall a. Maybe a
Prelude.Nothing,
      $sel:nextToken:GetBatchPredictionJobs' :: Maybe Text
nextToken = forall a. Maybe a
Prelude.Nothing
    }

-- | The batch prediction job for which to get the details.
getBatchPredictionJobs_jobId :: Lens.Lens' GetBatchPredictionJobs (Prelude.Maybe Prelude.Text)
getBatchPredictionJobs_jobId :: Lens' GetBatchPredictionJobs (Maybe Text)
getBatchPredictionJobs_jobId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetBatchPredictionJobs' {Maybe Text
jobId :: Maybe Text
$sel:jobId:GetBatchPredictionJobs' :: GetBatchPredictionJobs -> Maybe Text
jobId} -> Maybe Text
jobId) (\s :: GetBatchPredictionJobs
s@GetBatchPredictionJobs' {} Maybe Text
a -> GetBatchPredictionJobs
s {$sel:jobId:GetBatchPredictionJobs' :: Maybe Text
jobId = Maybe Text
a} :: GetBatchPredictionJobs)

-- | The maximum number of objects to return for the request.
getBatchPredictionJobs_maxResults :: Lens.Lens' GetBatchPredictionJobs (Prelude.Maybe Prelude.Natural)
getBatchPredictionJobs_maxResults :: Lens' GetBatchPredictionJobs (Maybe Natural)
getBatchPredictionJobs_maxResults = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetBatchPredictionJobs' {Maybe Natural
maxResults :: Maybe Natural
$sel:maxResults:GetBatchPredictionJobs' :: GetBatchPredictionJobs -> Maybe Natural
maxResults} -> Maybe Natural
maxResults) (\s :: GetBatchPredictionJobs
s@GetBatchPredictionJobs' {} Maybe Natural
a -> GetBatchPredictionJobs
s {$sel:maxResults:GetBatchPredictionJobs' :: Maybe Natural
maxResults = Maybe Natural
a} :: GetBatchPredictionJobs)

-- | The next token from the previous request.
getBatchPredictionJobs_nextToken :: Lens.Lens' GetBatchPredictionJobs (Prelude.Maybe Prelude.Text)
getBatchPredictionJobs_nextToken :: Lens' GetBatchPredictionJobs (Maybe Text)
getBatchPredictionJobs_nextToken = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetBatchPredictionJobs' {Maybe Text
nextToken :: Maybe Text
$sel:nextToken:GetBatchPredictionJobs' :: GetBatchPredictionJobs -> Maybe Text
nextToken} -> Maybe Text
nextToken) (\s :: GetBatchPredictionJobs
s@GetBatchPredictionJobs' {} Maybe Text
a -> GetBatchPredictionJobs
s {$sel:nextToken:GetBatchPredictionJobs' :: Maybe Text
nextToken = Maybe Text
a} :: GetBatchPredictionJobs)

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

instance Prelude.NFData GetBatchPredictionJobs where
  rnf :: GetBatchPredictionJobs -> ()
rnf GetBatchPredictionJobs' {Maybe Natural
Maybe Text
nextToken :: Maybe Text
maxResults :: Maybe Natural
jobId :: Maybe Text
$sel:nextToken:GetBatchPredictionJobs' :: GetBatchPredictionJobs -> Maybe Text
$sel:maxResults:GetBatchPredictionJobs' :: GetBatchPredictionJobs -> Maybe Natural
$sel:jobId:GetBatchPredictionJobs' :: GetBatchPredictionJobs -> Maybe Text
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
jobId
      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

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

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

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

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

-- | /See:/ 'newGetBatchPredictionJobsResponse' smart constructor.
data GetBatchPredictionJobsResponse = GetBatchPredictionJobsResponse'
  { -- | An array containing the details of each batch prediction job.
    GetBatchPredictionJobsResponse -> Maybe [BatchPrediction]
batchPredictions :: Prelude.Maybe [BatchPrediction],
    -- | The next token for the subsequent request.
    GetBatchPredictionJobsResponse -> Maybe Text
nextToken :: Prelude.Maybe Prelude.Text,
    -- | The response's http status code.
    GetBatchPredictionJobsResponse -> Int
httpStatus :: Prelude.Int
  }
  deriving (GetBatchPredictionJobsResponse
-> GetBatchPredictionJobsResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: GetBatchPredictionJobsResponse
-> GetBatchPredictionJobsResponse -> Bool
$c/= :: GetBatchPredictionJobsResponse
-> GetBatchPredictionJobsResponse -> Bool
== :: GetBatchPredictionJobsResponse
-> GetBatchPredictionJobsResponse -> Bool
$c== :: GetBatchPredictionJobsResponse
-> GetBatchPredictionJobsResponse -> Bool
Prelude.Eq, ReadPrec [GetBatchPredictionJobsResponse]
ReadPrec GetBatchPredictionJobsResponse
Int -> ReadS GetBatchPredictionJobsResponse
ReadS [GetBatchPredictionJobsResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [GetBatchPredictionJobsResponse]
$creadListPrec :: ReadPrec [GetBatchPredictionJobsResponse]
readPrec :: ReadPrec GetBatchPredictionJobsResponse
$creadPrec :: ReadPrec GetBatchPredictionJobsResponse
readList :: ReadS [GetBatchPredictionJobsResponse]
$creadList :: ReadS [GetBatchPredictionJobsResponse]
readsPrec :: Int -> ReadS GetBatchPredictionJobsResponse
$creadsPrec :: Int -> ReadS GetBatchPredictionJobsResponse
Prelude.Read, Int -> GetBatchPredictionJobsResponse -> ShowS
[GetBatchPredictionJobsResponse] -> ShowS
GetBatchPredictionJobsResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [GetBatchPredictionJobsResponse] -> ShowS
$cshowList :: [GetBatchPredictionJobsResponse] -> ShowS
show :: GetBatchPredictionJobsResponse -> String
$cshow :: GetBatchPredictionJobsResponse -> String
showsPrec :: Int -> GetBatchPredictionJobsResponse -> ShowS
$cshowsPrec :: Int -> GetBatchPredictionJobsResponse -> ShowS
Prelude.Show, forall x.
Rep GetBatchPredictionJobsResponse x
-> GetBatchPredictionJobsResponse
forall x.
GetBatchPredictionJobsResponse
-> Rep GetBatchPredictionJobsResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep GetBatchPredictionJobsResponse x
-> GetBatchPredictionJobsResponse
$cfrom :: forall x.
GetBatchPredictionJobsResponse
-> Rep GetBatchPredictionJobsResponse x
Prelude.Generic)

-- |
-- Create a value of 'GetBatchPredictionJobsResponse' 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:
--
-- 'batchPredictions', 'getBatchPredictionJobsResponse_batchPredictions' - An array containing the details of each batch prediction job.
--
-- 'nextToken', 'getBatchPredictionJobsResponse_nextToken' - The next token for the subsequent request.
--
-- 'httpStatus', 'getBatchPredictionJobsResponse_httpStatus' - The response's http status code.
newGetBatchPredictionJobsResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  GetBatchPredictionJobsResponse
newGetBatchPredictionJobsResponse :: Int -> GetBatchPredictionJobsResponse
newGetBatchPredictionJobsResponse Int
pHttpStatus_ =
  GetBatchPredictionJobsResponse'
    { $sel:batchPredictions:GetBatchPredictionJobsResponse' :: Maybe [BatchPrediction]
batchPredictions =
        forall a. Maybe a
Prelude.Nothing,
      $sel:nextToken:GetBatchPredictionJobsResponse' :: Maybe Text
nextToken = forall a. Maybe a
Prelude.Nothing,
      $sel:httpStatus:GetBatchPredictionJobsResponse' :: Int
httpStatus = Int
pHttpStatus_
    }

-- | An array containing the details of each batch prediction job.
getBatchPredictionJobsResponse_batchPredictions :: Lens.Lens' GetBatchPredictionJobsResponse (Prelude.Maybe [BatchPrediction])
getBatchPredictionJobsResponse_batchPredictions :: Lens' GetBatchPredictionJobsResponse (Maybe [BatchPrediction])
getBatchPredictionJobsResponse_batchPredictions = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetBatchPredictionJobsResponse' {Maybe [BatchPrediction]
batchPredictions :: Maybe [BatchPrediction]
$sel:batchPredictions:GetBatchPredictionJobsResponse' :: GetBatchPredictionJobsResponse -> Maybe [BatchPrediction]
batchPredictions} -> Maybe [BatchPrediction]
batchPredictions) (\s :: GetBatchPredictionJobsResponse
s@GetBatchPredictionJobsResponse' {} Maybe [BatchPrediction]
a -> GetBatchPredictionJobsResponse
s {$sel:batchPredictions:GetBatchPredictionJobsResponse' :: Maybe [BatchPrediction]
batchPredictions = Maybe [BatchPrediction]
a} :: GetBatchPredictionJobsResponse) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping forall s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced

-- | The next token for the subsequent request.
getBatchPredictionJobsResponse_nextToken :: Lens.Lens' GetBatchPredictionJobsResponse (Prelude.Maybe Prelude.Text)
getBatchPredictionJobsResponse_nextToken :: Lens' GetBatchPredictionJobsResponse (Maybe Text)
getBatchPredictionJobsResponse_nextToken = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetBatchPredictionJobsResponse' {Maybe Text
nextToken :: Maybe Text
$sel:nextToken:GetBatchPredictionJobsResponse' :: GetBatchPredictionJobsResponse -> Maybe Text
nextToken} -> Maybe Text
nextToken) (\s :: GetBatchPredictionJobsResponse
s@GetBatchPredictionJobsResponse' {} Maybe Text
a -> GetBatchPredictionJobsResponse
s {$sel:nextToken:GetBatchPredictionJobsResponse' :: Maybe Text
nextToken = Maybe Text
a} :: GetBatchPredictionJobsResponse)

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

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