{-# 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.GetVectorEnrichmentJob
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
--
-- Retrieves details of a Vector Enrichment Job for a given job Amazon
-- Resource Name (ARN).
module Amazonka.SageMakerGeoSpatial.GetVectorEnrichmentJob
  ( -- * Creating a Request
    GetVectorEnrichmentJob (..),
    newGetVectorEnrichmentJob,

    -- * Request Lenses
    getVectorEnrichmentJob_arn,

    -- * Destructuring the Response
    GetVectorEnrichmentJobResponse (..),
    newGetVectorEnrichmentJobResponse,

    -- * Response Lenses
    getVectorEnrichmentJobResponse_errorDetails,
    getVectorEnrichmentJobResponse_exportErrorDetails,
    getVectorEnrichmentJobResponse_exportStatus,
    getVectorEnrichmentJobResponse_kmsKeyId,
    getVectorEnrichmentJobResponse_tags,
    getVectorEnrichmentJobResponse_httpStatus,
    getVectorEnrichmentJobResponse_arn,
    getVectorEnrichmentJobResponse_creationTime,
    getVectorEnrichmentJobResponse_durationInSeconds,
    getVectorEnrichmentJobResponse_executionRoleArn,
    getVectorEnrichmentJobResponse_inputConfig,
    getVectorEnrichmentJobResponse_jobConfig,
    getVectorEnrichmentJobResponse_name,
    getVectorEnrichmentJobResponse_status,
    getVectorEnrichmentJobResponse_type,
  )
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:/ 'newGetVectorEnrichmentJob' smart constructor.
data GetVectorEnrichmentJob = GetVectorEnrichmentJob'
  { -- | The Amazon Resource Name (ARN) of the Vector Enrichment job.
    GetVectorEnrichmentJob -> Text
arn :: Prelude.Text
  }
  deriving (GetVectorEnrichmentJob -> GetVectorEnrichmentJob -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: GetVectorEnrichmentJob -> GetVectorEnrichmentJob -> Bool
$c/= :: GetVectorEnrichmentJob -> GetVectorEnrichmentJob -> Bool
== :: GetVectorEnrichmentJob -> GetVectorEnrichmentJob -> Bool
$c== :: GetVectorEnrichmentJob -> GetVectorEnrichmentJob -> Bool
Prelude.Eq, ReadPrec [GetVectorEnrichmentJob]
ReadPrec GetVectorEnrichmentJob
Int -> ReadS GetVectorEnrichmentJob
ReadS [GetVectorEnrichmentJob]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [GetVectorEnrichmentJob]
$creadListPrec :: ReadPrec [GetVectorEnrichmentJob]
readPrec :: ReadPrec GetVectorEnrichmentJob
$creadPrec :: ReadPrec GetVectorEnrichmentJob
readList :: ReadS [GetVectorEnrichmentJob]
$creadList :: ReadS [GetVectorEnrichmentJob]
readsPrec :: Int -> ReadS GetVectorEnrichmentJob
$creadsPrec :: Int -> ReadS GetVectorEnrichmentJob
Prelude.Read, Int -> GetVectorEnrichmentJob -> ShowS
[GetVectorEnrichmentJob] -> ShowS
GetVectorEnrichmentJob -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [GetVectorEnrichmentJob] -> ShowS
$cshowList :: [GetVectorEnrichmentJob] -> ShowS
show :: GetVectorEnrichmentJob -> String
$cshow :: GetVectorEnrichmentJob -> String
showsPrec :: Int -> GetVectorEnrichmentJob -> ShowS
$cshowsPrec :: Int -> GetVectorEnrichmentJob -> ShowS
Prelude.Show, forall x. Rep GetVectorEnrichmentJob x -> GetVectorEnrichmentJob
forall x. GetVectorEnrichmentJob -> Rep GetVectorEnrichmentJob x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep GetVectorEnrichmentJob x -> GetVectorEnrichmentJob
$cfrom :: forall x. GetVectorEnrichmentJob -> Rep GetVectorEnrichmentJob x
Prelude.Generic)

-- |
-- Create a value of 'GetVectorEnrichmentJob' 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:
--
-- 'arn', 'getVectorEnrichmentJob_arn' - The Amazon Resource Name (ARN) of the Vector Enrichment job.
newGetVectorEnrichmentJob ::
  -- | 'arn'
  Prelude.Text ->
  GetVectorEnrichmentJob
newGetVectorEnrichmentJob :: Text -> GetVectorEnrichmentJob
newGetVectorEnrichmentJob Text
pArn_ =
  GetVectorEnrichmentJob' {$sel:arn:GetVectorEnrichmentJob' :: Text
arn = Text
pArn_}

-- | The Amazon Resource Name (ARN) of the Vector Enrichment job.
getVectorEnrichmentJob_arn :: Lens.Lens' GetVectorEnrichmentJob Prelude.Text
getVectorEnrichmentJob_arn :: Lens' GetVectorEnrichmentJob Text
getVectorEnrichmentJob_arn = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetVectorEnrichmentJob' {Text
arn :: Text
$sel:arn:GetVectorEnrichmentJob' :: GetVectorEnrichmentJob -> Text
arn} -> Text
arn) (\s :: GetVectorEnrichmentJob
s@GetVectorEnrichmentJob' {} Text
a -> GetVectorEnrichmentJob
s {$sel:arn:GetVectorEnrichmentJob' :: Text
arn = Text
a} :: GetVectorEnrichmentJob)

instance Core.AWSRequest GetVectorEnrichmentJob where
  type
    AWSResponse GetVectorEnrichmentJob =
      GetVectorEnrichmentJobResponse
  request :: (Service -> Service)
-> GetVectorEnrichmentJob -> Request GetVectorEnrichmentJob
request Service -> Service
overrides =
    forall a. ToRequest a => Service -> a -> Request a
Request.get (Service -> Service
overrides Service
defaultService)
  response :: forall (m :: * -> *).
MonadResource m =>
(ByteStringLazy -> IO ByteStringLazy)
-> Service
-> Proxy GetVectorEnrichmentJob
-> ClientResponse ClientBody
-> m (Either
        Error (ClientResponse (AWSResponse GetVectorEnrichmentJob)))
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 VectorEnrichmentJobErrorDetails
-> Maybe VectorEnrichmentJobExportErrorDetails
-> Maybe VectorEnrichmentJobExportStatus
-> Maybe Text
-> Maybe (HashMap Text Text)
-> Int
-> Text
-> POSIX
-> Int
-> Text
-> VectorEnrichmentJobInputConfig
-> VectorEnrichmentJobConfig
-> Text
-> VectorEnrichmentJobStatus
-> VectorEnrichmentJobType
-> GetVectorEnrichmentJobResponse
GetVectorEnrichmentJobResponse'
            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
"ErrorDetails")
            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
"ExportErrorDetails")
            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
"ExportStatus")
            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
"KmsKeyId")
            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
"Tags" 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.<*> (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
"Arn")
            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
"CreationTime")
            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
"DurationInSeconds")
            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
"ExecutionRoleArn")
            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
"InputConfig")
            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
"JobConfig")
            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
"Name")
            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
"Status")
            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
"Type")
      )

instance Prelude.Hashable GetVectorEnrichmentJob where
  hashWithSalt :: Int -> GetVectorEnrichmentJob -> Int
hashWithSalt Int
_salt GetVectorEnrichmentJob' {Text
arn :: Text
$sel:arn:GetVectorEnrichmentJob' :: GetVectorEnrichmentJob -> Text
..} =
    Int
_salt forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
arn

instance Prelude.NFData GetVectorEnrichmentJob where
  rnf :: GetVectorEnrichmentJob -> ()
rnf GetVectorEnrichmentJob' {Text
arn :: Text
$sel:arn:GetVectorEnrichmentJob' :: GetVectorEnrichmentJob -> Text
..} = forall a. NFData a => a -> ()
Prelude.rnf Text
arn

instance Data.ToHeaders GetVectorEnrichmentJob where
  toHeaders :: GetVectorEnrichmentJob -> 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.ToPath GetVectorEnrichmentJob where
  toPath :: GetVectorEnrichmentJob -> ByteString
toPath GetVectorEnrichmentJob' {Text
arn :: Text
$sel:arn:GetVectorEnrichmentJob' :: GetVectorEnrichmentJob -> Text
..} =
    forall a. Monoid a => [a] -> a
Prelude.mconcat
      [ByteString
"/vector-enrichment-jobs/", forall a. ToByteString a => a -> ByteString
Data.toBS Text
arn]

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

-- | /See:/ 'newGetVectorEnrichmentJobResponse' smart constructor.
data GetVectorEnrichmentJobResponse = GetVectorEnrichmentJobResponse'
  { -- | Details about the errors generated during the Vector Enrichment job.
    GetVectorEnrichmentJobResponse
-> Maybe VectorEnrichmentJobErrorDetails
errorDetails :: Prelude.Maybe VectorEnrichmentJobErrorDetails,
    -- | Details about the errors generated during the ExportVectorEnrichmentJob.
    GetVectorEnrichmentJobResponse
-> Maybe VectorEnrichmentJobExportErrorDetails
exportErrorDetails :: Prelude.Maybe VectorEnrichmentJobExportErrorDetails,
    -- | The export status of the Vector Enrichment job being initiated.
    GetVectorEnrichmentJobResponse
-> Maybe VectorEnrichmentJobExportStatus
exportStatus :: Prelude.Maybe VectorEnrichmentJobExportStatus,
    -- | The Amazon Key Management Service (KMS) key ID for server-side
    -- encryption.
    GetVectorEnrichmentJobResponse -> Maybe Text
kmsKeyId :: Prelude.Maybe Prelude.Text,
    -- | Each tag consists of a key and a value.
    GetVectorEnrichmentJobResponse -> Maybe (HashMap Text Text)
tags :: Prelude.Maybe (Prelude.HashMap Prelude.Text Prelude.Text),
    -- | The response's http status code.
    GetVectorEnrichmentJobResponse -> Int
httpStatus :: Prelude.Int,
    -- | The Amazon Resource Name (ARN) of the Vector Enrichment job.
    GetVectorEnrichmentJobResponse -> Text
arn :: Prelude.Text,
    -- | The creation time.
    GetVectorEnrichmentJobResponse -> POSIX
creationTime :: Data.POSIX,
    -- | The duration of the Vector Enrichment job, in seconds.
    GetVectorEnrichmentJobResponse -> Int
durationInSeconds :: Prelude.Int,
    -- | The Amazon Resource Name (ARN) of the IAM role that you specified for
    -- the job.
    GetVectorEnrichmentJobResponse -> Text
executionRoleArn :: Prelude.Text,
    -- | Input configuration information for the Vector Enrichment job.
    GetVectorEnrichmentJobResponse -> VectorEnrichmentJobInputConfig
inputConfig :: VectorEnrichmentJobInputConfig,
    -- | An object containing information about the job configuration.
    GetVectorEnrichmentJobResponse -> VectorEnrichmentJobConfig
jobConfig :: VectorEnrichmentJobConfig,
    -- | The name of the Vector Enrichment job.
    GetVectorEnrichmentJobResponse -> Text
name :: Prelude.Text,
    -- | The status of the initiated Vector Enrichment job.
    GetVectorEnrichmentJobResponse -> VectorEnrichmentJobStatus
status :: VectorEnrichmentJobStatus,
    -- | The type of the Vector Enrichment job being initiated.
    GetVectorEnrichmentJobResponse -> VectorEnrichmentJobType
type' :: VectorEnrichmentJobType
  }
  deriving (GetVectorEnrichmentJobResponse
-> GetVectorEnrichmentJobResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: GetVectorEnrichmentJobResponse
-> GetVectorEnrichmentJobResponse -> Bool
$c/= :: GetVectorEnrichmentJobResponse
-> GetVectorEnrichmentJobResponse -> Bool
== :: GetVectorEnrichmentJobResponse
-> GetVectorEnrichmentJobResponse -> Bool
$c== :: GetVectorEnrichmentJobResponse
-> GetVectorEnrichmentJobResponse -> Bool
Prelude.Eq, ReadPrec [GetVectorEnrichmentJobResponse]
ReadPrec GetVectorEnrichmentJobResponse
Int -> ReadS GetVectorEnrichmentJobResponse
ReadS [GetVectorEnrichmentJobResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [GetVectorEnrichmentJobResponse]
$creadListPrec :: ReadPrec [GetVectorEnrichmentJobResponse]
readPrec :: ReadPrec GetVectorEnrichmentJobResponse
$creadPrec :: ReadPrec GetVectorEnrichmentJobResponse
readList :: ReadS [GetVectorEnrichmentJobResponse]
$creadList :: ReadS [GetVectorEnrichmentJobResponse]
readsPrec :: Int -> ReadS GetVectorEnrichmentJobResponse
$creadsPrec :: Int -> ReadS GetVectorEnrichmentJobResponse
Prelude.Read, Int -> GetVectorEnrichmentJobResponse -> ShowS
[GetVectorEnrichmentJobResponse] -> ShowS
GetVectorEnrichmentJobResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [GetVectorEnrichmentJobResponse] -> ShowS
$cshowList :: [GetVectorEnrichmentJobResponse] -> ShowS
show :: GetVectorEnrichmentJobResponse -> String
$cshow :: GetVectorEnrichmentJobResponse -> String
showsPrec :: Int -> GetVectorEnrichmentJobResponse -> ShowS
$cshowsPrec :: Int -> GetVectorEnrichmentJobResponse -> ShowS
Prelude.Show, forall x.
Rep GetVectorEnrichmentJobResponse x
-> GetVectorEnrichmentJobResponse
forall x.
GetVectorEnrichmentJobResponse
-> Rep GetVectorEnrichmentJobResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep GetVectorEnrichmentJobResponse x
-> GetVectorEnrichmentJobResponse
$cfrom :: forall x.
GetVectorEnrichmentJobResponse
-> Rep GetVectorEnrichmentJobResponse x
Prelude.Generic)

-- |
-- Create a value of 'GetVectorEnrichmentJobResponse' 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:
--
-- 'errorDetails', 'getVectorEnrichmentJobResponse_errorDetails' - Details about the errors generated during the Vector Enrichment job.
--
-- 'exportErrorDetails', 'getVectorEnrichmentJobResponse_exportErrorDetails' - Details about the errors generated during the ExportVectorEnrichmentJob.
--
-- 'exportStatus', 'getVectorEnrichmentJobResponse_exportStatus' - The export status of the Vector Enrichment job being initiated.
--
-- 'kmsKeyId', 'getVectorEnrichmentJobResponse_kmsKeyId' - The Amazon Key Management Service (KMS) key ID for server-side
-- encryption.
--
-- 'tags', 'getVectorEnrichmentJobResponse_tags' - Each tag consists of a key and a value.
--
-- 'httpStatus', 'getVectorEnrichmentJobResponse_httpStatus' - The response's http status code.
--
-- 'arn', 'getVectorEnrichmentJobResponse_arn' - The Amazon Resource Name (ARN) of the Vector Enrichment job.
--
-- 'creationTime', 'getVectorEnrichmentJobResponse_creationTime' - The creation time.
--
-- 'durationInSeconds', 'getVectorEnrichmentJobResponse_durationInSeconds' - The duration of the Vector Enrichment job, in seconds.
--
-- 'executionRoleArn', 'getVectorEnrichmentJobResponse_executionRoleArn' - The Amazon Resource Name (ARN) of the IAM role that you specified for
-- the job.
--
-- 'inputConfig', 'getVectorEnrichmentJobResponse_inputConfig' - Input configuration information for the Vector Enrichment job.
--
-- 'jobConfig', 'getVectorEnrichmentJobResponse_jobConfig' - An object containing information about the job configuration.
--
-- 'name', 'getVectorEnrichmentJobResponse_name' - The name of the Vector Enrichment job.
--
-- 'status', 'getVectorEnrichmentJobResponse_status' - The status of the initiated Vector Enrichment job.
--
-- 'type'', 'getVectorEnrichmentJobResponse_type' - The type of the Vector Enrichment job being initiated.
newGetVectorEnrichmentJobResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  -- | 'arn'
  Prelude.Text ->
  -- | 'creationTime'
  Prelude.UTCTime ->
  -- | 'durationInSeconds'
  Prelude.Int ->
  -- | 'executionRoleArn'
  Prelude.Text ->
  -- | 'inputConfig'
  VectorEnrichmentJobInputConfig ->
  -- | 'jobConfig'
  VectorEnrichmentJobConfig ->
  -- | 'name'
  Prelude.Text ->
  -- | 'status'
  VectorEnrichmentJobStatus ->
  -- | 'type''
  VectorEnrichmentJobType ->
  GetVectorEnrichmentJobResponse
newGetVectorEnrichmentJobResponse :: Int
-> Text
-> UTCTime
-> Int
-> Text
-> VectorEnrichmentJobInputConfig
-> VectorEnrichmentJobConfig
-> Text
-> VectorEnrichmentJobStatus
-> VectorEnrichmentJobType
-> GetVectorEnrichmentJobResponse
newGetVectorEnrichmentJobResponse
  Int
pHttpStatus_
  Text
pArn_
  UTCTime
pCreationTime_
  Int
pDurationInSeconds_
  Text
pExecutionRoleArn_
  VectorEnrichmentJobInputConfig
pInputConfig_
  VectorEnrichmentJobConfig
pJobConfig_
  Text
pName_
  VectorEnrichmentJobStatus
pStatus_
  VectorEnrichmentJobType
pType_ =
    GetVectorEnrichmentJobResponse'
      { $sel:errorDetails:GetVectorEnrichmentJobResponse' :: Maybe VectorEnrichmentJobErrorDetails
errorDetails =
          forall a. Maybe a
Prelude.Nothing,
        $sel:exportErrorDetails:GetVectorEnrichmentJobResponse' :: Maybe VectorEnrichmentJobExportErrorDetails
exportErrorDetails = forall a. Maybe a
Prelude.Nothing,
        $sel:exportStatus:GetVectorEnrichmentJobResponse' :: Maybe VectorEnrichmentJobExportStatus
exportStatus = forall a. Maybe a
Prelude.Nothing,
        $sel:kmsKeyId:GetVectorEnrichmentJobResponse' :: Maybe Text
kmsKeyId = forall a. Maybe a
Prelude.Nothing,
        $sel:tags:GetVectorEnrichmentJobResponse' :: Maybe (HashMap Text Text)
tags = forall a. Maybe a
Prelude.Nothing,
        $sel:httpStatus:GetVectorEnrichmentJobResponse' :: Int
httpStatus = Int
pHttpStatus_,
        $sel:arn:GetVectorEnrichmentJobResponse' :: Text
arn = Text
pArn_,
        $sel:creationTime:GetVectorEnrichmentJobResponse' :: POSIX
creationTime =
          forall (a :: Format). Iso' (Time a) UTCTime
Data._Time forall t b. AReview t b -> b -> t
Lens.# UTCTime
pCreationTime_,
        $sel:durationInSeconds:GetVectorEnrichmentJobResponse' :: Int
durationInSeconds = Int
pDurationInSeconds_,
        $sel:executionRoleArn:GetVectorEnrichmentJobResponse' :: Text
executionRoleArn = Text
pExecutionRoleArn_,
        $sel:inputConfig:GetVectorEnrichmentJobResponse' :: VectorEnrichmentJobInputConfig
inputConfig = VectorEnrichmentJobInputConfig
pInputConfig_,
        $sel:jobConfig:GetVectorEnrichmentJobResponse' :: VectorEnrichmentJobConfig
jobConfig = VectorEnrichmentJobConfig
pJobConfig_,
        $sel:name:GetVectorEnrichmentJobResponse' :: Text
name = Text
pName_,
        $sel:status:GetVectorEnrichmentJobResponse' :: VectorEnrichmentJobStatus
status = VectorEnrichmentJobStatus
pStatus_,
        $sel:type':GetVectorEnrichmentJobResponse' :: VectorEnrichmentJobType
type' = VectorEnrichmentJobType
pType_
      }

-- | Details about the errors generated during the Vector Enrichment job.
getVectorEnrichmentJobResponse_errorDetails :: Lens.Lens' GetVectorEnrichmentJobResponse (Prelude.Maybe VectorEnrichmentJobErrorDetails)
getVectorEnrichmentJobResponse_errorDetails :: Lens'
  GetVectorEnrichmentJobResponse
  (Maybe VectorEnrichmentJobErrorDetails)
getVectorEnrichmentJobResponse_errorDetails = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetVectorEnrichmentJobResponse' {Maybe VectorEnrichmentJobErrorDetails
errorDetails :: Maybe VectorEnrichmentJobErrorDetails
$sel:errorDetails:GetVectorEnrichmentJobResponse' :: GetVectorEnrichmentJobResponse
-> Maybe VectorEnrichmentJobErrorDetails
errorDetails} -> Maybe VectorEnrichmentJobErrorDetails
errorDetails) (\s :: GetVectorEnrichmentJobResponse
s@GetVectorEnrichmentJobResponse' {} Maybe VectorEnrichmentJobErrorDetails
a -> GetVectorEnrichmentJobResponse
s {$sel:errorDetails:GetVectorEnrichmentJobResponse' :: Maybe VectorEnrichmentJobErrorDetails
errorDetails = Maybe VectorEnrichmentJobErrorDetails
a} :: GetVectorEnrichmentJobResponse)

-- | Details about the errors generated during the ExportVectorEnrichmentJob.
getVectorEnrichmentJobResponse_exportErrorDetails :: Lens.Lens' GetVectorEnrichmentJobResponse (Prelude.Maybe VectorEnrichmentJobExportErrorDetails)
getVectorEnrichmentJobResponse_exportErrorDetails :: Lens'
  GetVectorEnrichmentJobResponse
  (Maybe VectorEnrichmentJobExportErrorDetails)
getVectorEnrichmentJobResponse_exportErrorDetails = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetVectorEnrichmentJobResponse' {Maybe VectorEnrichmentJobExportErrorDetails
exportErrorDetails :: Maybe VectorEnrichmentJobExportErrorDetails
$sel:exportErrorDetails:GetVectorEnrichmentJobResponse' :: GetVectorEnrichmentJobResponse
-> Maybe VectorEnrichmentJobExportErrorDetails
exportErrorDetails} -> Maybe VectorEnrichmentJobExportErrorDetails
exportErrorDetails) (\s :: GetVectorEnrichmentJobResponse
s@GetVectorEnrichmentJobResponse' {} Maybe VectorEnrichmentJobExportErrorDetails
a -> GetVectorEnrichmentJobResponse
s {$sel:exportErrorDetails:GetVectorEnrichmentJobResponse' :: Maybe VectorEnrichmentJobExportErrorDetails
exportErrorDetails = Maybe VectorEnrichmentJobExportErrorDetails
a} :: GetVectorEnrichmentJobResponse)

-- | The export status of the Vector Enrichment job being initiated.
getVectorEnrichmentJobResponse_exportStatus :: Lens.Lens' GetVectorEnrichmentJobResponse (Prelude.Maybe VectorEnrichmentJobExportStatus)
getVectorEnrichmentJobResponse_exportStatus :: Lens'
  GetVectorEnrichmentJobResponse
  (Maybe VectorEnrichmentJobExportStatus)
getVectorEnrichmentJobResponse_exportStatus = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetVectorEnrichmentJobResponse' {Maybe VectorEnrichmentJobExportStatus
exportStatus :: Maybe VectorEnrichmentJobExportStatus
$sel:exportStatus:GetVectorEnrichmentJobResponse' :: GetVectorEnrichmentJobResponse
-> Maybe VectorEnrichmentJobExportStatus
exportStatus} -> Maybe VectorEnrichmentJobExportStatus
exportStatus) (\s :: GetVectorEnrichmentJobResponse
s@GetVectorEnrichmentJobResponse' {} Maybe VectorEnrichmentJobExportStatus
a -> GetVectorEnrichmentJobResponse
s {$sel:exportStatus:GetVectorEnrichmentJobResponse' :: Maybe VectorEnrichmentJobExportStatus
exportStatus = Maybe VectorEnrichmentJobExportStatus
a} :: GetVectorEnrichmentJobResponse)

-- | The Amazon Key Management Service (KMS) key ID for server-side
-- encryption.
getVectorEnrichmentJobResponse_kmsKeyId :: Lens.Lens' GetVectorEnrichmentJobResponse (Prelude.Maybe Prelude.Text)
getVectorEnrichmentJobResponse_kmsKeyId :: Lens' GetVectorEnrichmentJobResponse (Maybe Text)
getVectorEnrichmentJobResponse_kmsKeyId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetVectorEnrichmentJobResponse' {Maybe Text
kmsKeyId :: Maybe Text
$sel:kmsKeyId:GetVectorEnrichmentJobResponse' :: GetVectorEnrichmentJobResponse -> Maybe Text
kmsKeyId} -> Maybe Text
kmsKeyId) (\s :: GetVectorEnrichmentJobResponse
s@GetVectorEnrichmentJobResponse' {} Maybe Text
a -> GetVectorEnrichmentJobResponse
s {$sel:kmsKeyId:GetVectorEnrichmentJobResponse' :: Maybe Text
kmsKeyId = Maybe Text
a} :: GetVectorEnrichmentJobResponse)

-- | Each tag consists of a key and a value.
getVectorEnrichmentJobResponse_tags :: Lens.Lens' GetVectorEnrichmentJobResponse (Prelude.Maybe (Prelude.HashMap Prelude.Text Prelude.Text))
getVectorEnrichmentJobResponse_tags :: Lens' GetVectorEnrichmentJobResponse (Maybe (HashMap Text Text))
getVectorEnrichmentJobResponse_tags = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetVectorEnrichmentJobResponse' {Maybe (HashMap Text Text)
tags :: Maybe (HashMap Text Text)
$sel:tags:GetVectorEnrichmentJobResponse' :: GetVectorEnrichmentJobResponse -> Maybe (HashMap Text Text)
tags} -> Maybe (HashMap Text Text)
tags) (\s :: GetVectorEnrichmentJobResponse
s@GetVectorEnrichmentJobResponse' {} Maybe (HashMap Text Text)
a -> GetVectorEnrichmentJobResponse
s {$sel:tags:GetVectorEnrichmentJobResponse' :: Maybe (HashMap Text Text)
tags = Maybe (HashMap Text Text)
a} :: GetVectorEnrichmentJobResponse) 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 response's http status code.
getVectorEnrichmentJobResponse_httpStatus :: Lens.Lens' GetVectorEnrichmentJobResponse Prelude.Int
getVectorEnrichmentJobResponse_httpStatus :: Lens' GetVectorEnrichmentJobResponse Int
getVectorEnrichmentJobResponse_httpStatus = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetVectorEnrichmentJobResponse' {Int
httpStatus :: Int
$sel:httpStatus:GetVectorEnrichmentJobResponse' :: GetVectorEnrichmentJobResponse -> Int
httpStatus} -> Int
httpStatus) (\s :: GetVectorEnrichmentJobResponse
s@GetVectorEnrichmentJobResponse' {} Int
a -> GetVectorEnrichmentJobResponse
s {$sel:httpStatus:GetVectorEnrichmentJobResponse' :: Int
httpStatus = Int
a} :: GetVectorEnrichmentJobResponse)

-- | The Amazon Resource Name (ARN) of the Vector Enrichment job.
getVectorEnrichmentJobResponse_arn :: Lens.Lens' GetVectorEnrichmentJobResponse Prelude.Text
getVectorEnrichmentJobResponse_arn :: Lens' GetVectorEnrichmentJobResponse Text
getVectorEnrichmentJobResponse_arn = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetVectorEnrichmentJobResponse' {Text
arn :: Text
$sel:arn:GetVectorEnrichmentJobResponse' :: GetVectorEnrichmentJobResponse -> Text
arn} -> Text
arn) (\s :: GetVectorEnrichmentJobResponse
s@GetVectorEnrichmentJobResponse' {} Text
a -> GetVectorEnrichmentJobResponse
s {$sel:arn:GetVectorEnrichmentJobResponse' :: Text
arn = Text
a} :: GetVectorEnrichmentJobResponse)

-- | The creation time.
getVectorEnrichmentJobResponse_creationTime :: Lens.Lens' GetVectorEnrichmentJobResponse Prelude.UTCTime
getVectorEnrichmentJobResponse_creationTime :: Lens' GetVectorEnrichmentJobResponse UTCTime
getVectorEnrichmentJobResponse_creationTime = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetVectorEnrichmentJobResponse' {POSIX
creationTime :: POSIX
$sel:creationTime:GetVectorEnrichmentJobResponse' :: GetVectorEnrichmentJobResponse -> POSIX
creationTime} -> POSIX
creationTime) (\s :: GetVectorEnrichmentJobResponse
s@GetVectorEnrichmentJobResponse' {} POSIX
a -> GetVectorEnrichmentJobResponse
s {$sel:creationTime:GetVectorEnrichmentJobResponse' :: POSIX
creationTime = POSIX
a} :: GetVectorEnrichmentJobResponse) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (a :: Format). Iso' (Time a) UTCTime
Data._Time

-- | The duration of the Vector Enrichment job, in seconds.
getVectorEnrichmentJobResponse_durationInSeconds :: Lens.Lens' GetVectorEnrichmentJobResponse Prelude.Int
getVectorEnrichmentJobResponse_durationInSeconds :: Lens' GetVectorEnrichmentJobResponse Int
getVectorEnrichmentJobResponse_durationInSeconds = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetVectorEnrichmentJobResponse' {Int
durationInSeconds :: Int
$sel:durationInSeconds:GetVectorEnrichmentJobResponse' :: GetVectorEnrichmentJobResponse -> Int
durationInSeconds} -> Int
durationInSeconds) (\s :: GetVectorEnrichmentJobResponse
s@GetVectorEnrichmentJobResponse' {} Int
a -> GetVectorEnrichmentJobResponse
s {$sel:durationInSeconds:GetVectorEnrichmentJobResponse' :: Int
durationInSeconds = Int
a} :: GetVectorEnrichmentJobResponse)

-- | The Amazon Resource Name (ARN) of the IAM role that you specified for
-- the job.
getVectorEnrichmentJobResponse_executionRoleArn :: Lens.Lens' GetVectorEnrichmentJobResponse Prelude.Text
getVectorEnrichmentJobResponse_executionRoleArn :: Lens' GetVectorEnrichmentJobResponse Text
getVectorEnrichmentJobResponse_executionRoleArn = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetVectorEnrichmentJobResponse' {Text
executionRoleArn :: Text
$sel:executionRoleArn:GetVectorEnrichmentJobResponse' :: GetVectorEnrichmentJobResponse -> Text
executionRoleArn} -> Text
executionRoleArn) (\s :: GetVectorEnrichmentJobResponse
s@GetVectorEnrichmentJobResponse' {} Text
a -> GetVectorEnrichmentJobResponse
s {$sel:executionRoleArn:GetVectorEnrichmentJobResponse' :: Text
executionRoleArn = Text
a} :: GetVectorEnrichmentJobResponse)

-- | Input configuration information for the Vector Enrichment job.
getVectorEnrichmentJobResponse_inputConfig :: Lens.Lens' GetVectorEnrichmentJobResponse VectorEnrichmentJobInputConfig
getVectorEnrichmentJobResponse_inputConfig :: Lens' GetVectorEnrichmentJobResponse VectorEnrichmentJobInputConfig
getVectorEnrichmentJobResponse_inputConfig = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetVectorEnrichmentJobResponse' {VectorEnrichmentJobInputConfig
inputConfig :: VectorEnrichmentJobInputConfig
$sel:inputConfig:GetVectorEnrichmentJobResponse' :: GetVectorEnrichmentJobResponse -> VectorEnrichmentJobInputConfig
inputConfig} -> VectorEnrichmentJobInputConfig
inputConfig) (\s :: GetVectorEnrichmentJobResponse
s@GetVectorEnrichmentJobResponse' {} VectorEnrichmentJobInputConfig
a -> GetVectorEnrichmentJobResponse
s {$sel:inputConfig:GetVectorEnrichmentJobResponse' :: VectorEnrichmentJobInputConfig
inputConfig = VectorEnrichmentJobInputConfig
a} :: GetVectorEnrichmentJobResponse)

-- | An object containing information about the job configuration.
getVectorEnrichmentJobResponse_jobConfig :: Lens.Lens' GetVectorEnrichmentJobResponse VectorEnrichmentJobConfig
getVectorEnrichmentJobResponse_jobConfig :: Lens' GetVectorEnrichmentJobResponse VectorEnrichmentJobConfig
getVectorEnrichmentJobResponse_jobConfig = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetVectorEnrichmentJobResponse' {VectorEnrichmentJobConfig
jobConfig :: VectorEnrichmentJobConfig
$sel:jobConfig:GetVectorEnrichmentJobResponse' :: GetVectorEnrichmentJobResponse -> VectorEnrichmentJobConfig
jobConfig} -> VectorEnrichmentJobConfig
jobConfig) (\s :: GetVectorEnrichmentJobResponse
s@GetVectorEnrichmentJobResponse' {} VectorEnrichmentJobConfig
a -> GetVectorEnrichmentJobResponse
s {$sel:jobConfig:GetVectorEnrichmentJobResponse' :: VectorEnrichmentJobConfig
jobConfig = VectorEnrichmentJobConfig
a} :: GetVectorEnrichmentJobResponse)

-- | The name of the Vector Enrichment job.
getVectorEnrichmentJobResponse_name :: Lens.Lens' GetVectorEnrichmentJobResponse Prelude.Text
getVectorEnrichmentJobResponse_name :: Lens' GetVectorEnrichmentJobResponse Text
getVectorEnrichmentJobResponse_name = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetVectorEnrichmentJobResponse' {Text
name :: Text
$sel:name:GetVectorEnrichmentJobResponse' :: GetVectorEnrichmentJobResponse -> Text
name} -> Text
name) (\s :: GetVectorEnrichmentJobResponse
s@GetVectorEnrichmentJobResponse' {} Text
a -> GetVectorEnrichmentJobResponse
s {$sel:name:GetVectorEnrichmentJobResponse' :: Text
name = Text
a} :: GetVectorEnrichmentJobResponse)

-- | The status of the initiated Vector Enrichment job.
getVectorEnrichmentJobResponse_status :: Lens.Lens' GetVectorEnrichmentJobResponse VectorEnrichmentJobStatus
getVectorEnrichmentJobResponse_status :: Lens' GetVectorEnrichmentJobResponse VectorEnrichmentJobStatus
getVectorEnrichmentJobResponse_status = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetVectorEnrichmentJobResponse' {VectorEnrichmentJobStatus
status :: VectorEnrichmentJobStatus
$sel:status:GetVectorEnrichmentJobResponse' :: GetVectorEnrichmentJobResponse -> VectorEnrichmentJobStatus
status} -> VectorEnrichmentJobStatus
status) (\s :: GetVectorEnrichmentJobResponse
s@GetVectorEnrichmentJobResponse' {} VectorEnrichmentJobStatus
a -> GetVectorEnrichmentJobResponse
s {$sel:status:GetVectorEnrichmentJobResponse' :: VectorEnrichmentJobStatus
status = VectorEnrichmentJobStatus
a} :: GetVectorEnrichmentJobResponse)

-- | The type of the Vector Enrichment job being initiated.
getVectorEnrichmentJobResponse_type :: Lens.Lens' GetVectorEnrichmentJobResponse VectorEnrichmentJobType
getVectorEnrichmentJobResponse_type :: Lens' GetVectorEnrichmentJobResponse VectorEnrichmentJobType
getVectorEnrichmentJobResponse_type = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetVectorEnrichmentJobResponse' {VectorEnrichmentJobType
type' :: VectorEnrichmentJobType
$sel:type':GetVectorEnrichmentJobResponse' :: GetVectorEnrichmentJobResponse -> VectorEnrichmentJobType
type'} -> VectorEnrichmentJobType
type') (\s :: GetVectorEnrichmentJobResponse
s@GetVectorEnrichmentJobResponse' {} VectorEnrichmentJobType
a -> GetVectorEnrichmentJobResponse
s {$sel:type':GetVectorEnrichmentJobResponse' :: VectorEnrichmentJobType
type' = VectorEnrichmentJobType
a} :: GetVectorEnrichmentJobResponse)

instance
  Prelude.NFData
    GetVectorEnrichmentJobResponse
  where
  rnf :: GetVectorEnrichmentJobResponse -> ()
rnf GetVectorEnrichmentJobResponse' {Int
Maybe Text
Maybe (HashMap Text Text)
Maybe VectorEnrichmentJobErrorDetails
Maybe VectorEnrichmentJobExportErrorDetails
Maybe VectorEnrichmentJobExportStatus
Text
POSIX
VectorEnrichmentJobConfig
VectorEnrichmentJobInputConfig
VectorEnrichmentJobStatus
VectorEnrichmentJobType
type' :: VectorEnrichmentJobType
status :: VectorEnrichmentJobStatus
name :: Text
jobConfig :: VectorEnrichmentJobConfig
inputConfig :: VectorEnrichmentJobInputConfig
executionRoleArn :: Text
durationInSeconds :: Int
creationTime :: POSIX
arn :: Text
httpStatus :: Int
tags :: Maybe (HashMap Text Text)
kmsKeyId :: Maybe Text
exportStatus :: Maybe VectorEnrichmentJobExportStatus
exportErrorDetails :: Maybe VectorEnrichmentJobExportErrorDetails
errorDetails :: Maybe VectorEnrichmentJobErrorDetails
$sel:type':GetVectorEnrichmentJobResponse' :: GetVectorEnrichmentJobResponse -> VectorEnrichmentJobType
$sel:status:GetVectorEnrichmentJobResponse' :: GetVectorEnrichmentJobResponse -> VectorEnrichmentJobStatus
$sel:name:GetVectorEnrichmentJobResponse' :: GetVectorEnrichmentJobResponse -> Text
$sel:jobConfig:GetVectorEnrichmentJobResponse' :: GetVectorEnrichmentJobResponse -> VectorEnrichmentJobConfig
$sel:inputConfig:GetVectorEnrichmentJobResponse' :: GetVectorEnrichmentJobResponse -> VectorEnrichmentJobInputConfig
$sel:executionRoleArn:GetVectorEnrichmentJobResponse' :: GetVectorEnrichmentJobResponse -> Text
$sel:durationInSeconds:GetVectorEnrichmentJobResponse' :: GetVectorEnrichmentJobResponse -> Int
$sel:creationTime:GetVectorEnrichmentJobResponse' :: GetVectorEnrichmentJobResponse -> POSIX
$sel:arn:GetVectorEnrichmentJobResponse' :: GetVectorEnrichmentJobResponse -> Text
$sel:httpStatus:GetVectorEnrichmentJobResponse' :: GetVectorEnrichmentJobResponse -> Int
$sel:tags:GetVectorEnrichmentJobResponse' :: GetVectorEnrichmentJobResponse -> Maybe (HashMap Text Text)
$sel:kmsKeyId:GetVectorEnrichmentJobResponse' :: GetVectorEnrichmentJobResponse -> Maybe Text
$sel:exportStatus:GetVectorEnrichmentJobResponse' :: GetVectorEnrichmentJobResponse
-> Maybe VectorEnrichmentJobExportStatus
$sel:exportErrorDetails:GetVectorEnrichmentJobResponse' :: GetVectorEnrichmentJobResponse
-> Maybe VectorEnrichmentJobExportErrorDetails
$sel:errorDetails:GetVectorEnrichmentJobResponse' :: GetVectorEnrichmentJobResponse
-> Maybe VectorEnrichmentJobErrorDetails
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe VectorEnrichmentJobErrorDetails
errorDetails
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe VectorEnrichmentJobExportErrorDetails
exportErrorDetails
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe VectorEnrichmentJobExportStatus
exportStatus
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
kmsKeyId
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe (HashMap Text Text)
tags
      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 Text
arn
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf POSIX
creationTime
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Int
durationInSeconds
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Text
executionRoleArn
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf VectorEnrichmentJobInputConfig
inputConfig
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf VectorEnrichmentJobConfig
jobConfig
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Text
name
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf VectorEnrichmentJobStatus
status
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf VectorEnrichmentJobType
type'