{-# 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.LexModels.GetImport
-- 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 information about an import job started with the @StartImport@
-- operation.
module Amazonka.LexModels.GetImport
  ( -- * Creating a Request
    GetImport (..),
    newGetImport,

    -- * Request Lenses
    getImport_importId,

    -- * Destructuring the Response
    GetImportResponse (..),
    newGetImportResponse,

    -- * Response Lenses
    getImportResponse_createdDate,
    getImportResponse_failureReason,
    getImportResponse_importId,
    getImportResponse_importStatus,
    getImportResponse_mergeStrategy,
    getImportResponse_name,
    getImportResponse_resourceType,
    getImportResponse_httpStatus,
  )
where

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

-- | /See:/ 'newGetImport' smart constructor.
data GetImport = GetImport'
  { -- | The identifier of the import job information to return.
    GetImport -> Text
importId :: Prelude.Text
  }
  deriving (GetImport -> GetImport -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: GetImport -> GetImport -> Bool
$c/= :: GetImport -> GetImport -> Bool
== :: GetImport -> GetImport -> Bool
$c== :: GetImport -> GetImport -> Bool
Prelude.Eq, ReadPrec [GetImport]
ReadPrec GetImport
Int -> ReadS GetImport
ReadS [GetImport]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [GetImport]
$creadListPrec :: ReadPrec [GetImport]
readPrec :: ReadPrec GetImport
$creadPrec :: ReadPrec GetImport
readList :: ReadS [GetImport]
$creadList :: ReadS [GetImport]
readsPrec :: Int -> ReadS GetImport
$creadsPrec :: Int -> ReadS GetImport
Prelude.Read, Int -> GetImport -> ShowS
[GetImport] -> ShowS
GetImport -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [GetImport] -> ShowS
$cshowList :: [GetImport] -> ShowS
show :: GetImport -> String
$cshow :: GetImport -> String
showsPrec :: Int -> GetImport -> ShowS
$cshowsPrec :: Int -> GetImport -> ShowS
Prelude.Show, forall x. Rep GetImport x -> GetImport
forall x. GetImport -> Rep GetImport x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep GetImport x -> GetImport
$cfrom :: forall x. GetImport -> Rep GetImport x
Prelude.Generic)

-- |
-- Create a value of 'GetImport' 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:
--
-- 'importId', 'getImport_importId' - The identifier of the import job information to return.
newGetImport ::
  -- | 'importId'
  Prelude.Text ->
  GetImport
newGetImport :: Text -> GetImport
newGetImport Text
pImportId_ =
  GetImport' {$sel:importId:GetImport' :: Text
importId = Text
pImportId_}

-- | The identifier of the import job information to return.
getImport_importId :: Lens.Lens' GetImport Prelude.Text
getImport_importId :: Lens' GetImport Text
getImport_importId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetImport' {Text
importId :: Text
$sel:importId:GetImport' :: GetImport -> Text
importId} -> Text
importId) (\s :: GetImport
s@GetImport' {} Text
a -> GetImport
s {$sel:importId:GetImport' :: Text
importId = Text
a} :: GetImport)

instance Core.AWSRequest GetImport where
  type AWSResponse GetImport = GetImportResponse
  request :: (Service -> Service) -> GetImport -> Request GetImport
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 GetImport
-> ClientResponse ClientBody
-> m (Either Error (ClientResponse (AWSResponse GetImport)))
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 POSIX
-> Maybe [Text]
-> Maybe Text
-> Maybe ImportStatus
-> Maybe MergeStrategy
-> Maybe Text
-> Maybe ResourceType
-> Int
-> GetImportResponse
GetImportResponse'
            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
"createdDate")
            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
"failureReason" 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
"importId")
            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
"importStatus")
            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
"mergeStrategy")
            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
"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 (Maybe a)
Data..?> Key
"resourceType")
            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 GetImport where
  hashWithSalt :: Int -> GetImport -> Int
hashWithSalt Int
_salt GetImport' {Text
importId :: Text
$sel:importId:GetImport' :: GetImport -> Text
..} =
    Int
_salt forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
importId

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

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

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

-- | /See:/ 'newGetImportResponse' smart constructor.
data GetImportResponse = GetImportResponse'
  { -- | A timestamp for the date and time that the import job was created.
    GetImportResponse -> Maybe POSIX
createdDate :: Prelude.Maybe Data.POSIX,
    -- | A string that describes why an import job failed to complete.
    GetImportResponse -> Maybe [Text]
failureReason :: Prelude.Maybe [Prelude.Text],
    -- | The identifier for the specific import job.
    GetImportResponse -> Maybe Text
importId :: Prelude.Maybe Prelude.Text,
    -- | The status of the import job. If the status is @FAILED@, you can get the
    -- reason for the failure from the @failureReason@ field.
    GetImportResponse -> Maybe ImportStatus
importStatus :: Prelude.Maybe ImportStatus,
    -- | The action taken when there was a conflict between an existing resource
    -- and a resource in the import file.
    GetImportResponse -> Maybe MergeStrategy
mergeStrategy :: Prelude.Maybe MergeStrategy,
    -- | The name given to the import job.
    GetImportResponse -> Maybe Text
name :: Prelude.Maybe Prelude.Text,
    -- | The type of resource imported.
    GetImportResponse -> Maybe ResourceType
resourceType :: Prelude.Maybe ResourceType,
    -- | The response's http status code.
    GetImportResponse -> Int
httpStatus :: Prelude.Int
  }
  deriving (GetImportResponse -> GetImportResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: GetImportResponse -> GetImportResponse -> Bool
$c/= :: GetImportResponse -> GetImportResponse -> Bool
== :: GetImportResponse -> GetImportResponse -> Bool
$c== :: GetImportResponse -> GetImportResponse -> Bool
Prelude.Eq, ReadPrec [GetImportResponse]
ReadPrec GetImportResponse
Int -> ReadS GetImportResponse
ReadS [GetImportResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [GetImportResponse]
$creadListPrec :: ReadPrec [GetImportResponse]
readPrec :: ReadPrec GetImportResponse
$creadPrec :: ReadPrec GetImportResponse
readList :: ReadS [GetImportResponse]
$creadList :: ReadS [GetImportResponse]
readsPrec :: Int -> ReadS GetImportResponse
$creadsPrec :: Int -> ReadS GetImportResponse
Prelude.Read, Int -> GetImportResponse -> ShowS
[GetImportResponse] -> ShowS
GetImportResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [GetImportResponse] -> ShowS
$cshowList :: [GetImportResponse] -> ShowS
show :: GetImportResponse -> String
$cshow :: GetImportResponse -> String
showsPrec :: Int -> GetImportResponse -> ShowS
$cshowsPrec :: Int -> GetImportResponse -> ShowS
Prelude.Show, forall x. Rep GetImportResponse x -> GetImportResponse
forall x. GetImportResponse -> Rep GetImportResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep GetImportResponse x -> GetImportResponse
$cfrom :: forall x. GetImportResponse -> Rep GetImportResponse x
Prelude.Generic)

-- |
-- Create a value of 'GetImportResponse' 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:
--
-- 'createdDate', 'getImportResponse_createdDate' - A timestamp for the date and time that the import job was created.
--
-- 'failureReason', 'getImportResponse_failureReason' - A string that describes why an import job failed to complete.
--
-- 'importId', 'getImportResponse_importId' - The identifier for the specific import job.
--
-- 'importStatus', 'getImportResponse_importStatus' - The status of the import job. If the status is @FAILED@, you can get the
-- reason for the failure from the @failureReason@ field.
--
-- 'mergeStrategy', 'getImportResponse_mergeStrategy' - The action taken when there was a conflict between an existing resource
-- and a resource in the import file.
--
-- 'name', 'getImportResponse_name' - The name given to the import job.
--
-- 'resourceType', 'getImportResponse_resourceType' - The type of resource imported.
--
-- 'httpStatus', 'getImportResponse_httpStatus' - The response's http status code.
newGetImportResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  GetImportResponse
newGetImportResponse :: Int -> GetImportResponse
newGetImportResponse Int
pHttpStatus_ =
  GetImportResponse'
    { $sel:createdDate:GetImportResponse' :: Maybe POSIX
createdDate = forall a. Maybe a
Prelude.Nothing,
      $sel:failureReason:GetImportResponse' :: Maybe [Text]
failureReason = forall a. Maybe a
Prelude.Nothing,
      $sel:importId:GetImportResponse' :: Maybe Text
importId = forall a. Maybe a
Prelude.Nothing,
      $sel:importStatus:GetImportResponse' :: Maybe ImportStatus
importStatus = forall a. Maybe a
Prelude.Nothing,
      $sel:mergeStrategy:GetImportResponse' :: Maybe MergeStrategy
mergeStrategy = forall a. Maybe a
Prelude.Nothing,
      $sel:name:GetImportResponse' :: Maybe Text
name = forall a. Maybe a
Prelude.Nothing,
      $sel:resourceType:GetImportResponse' :: Maybe ResourceType
resourceType = forall a. Maybe a
Prelude.Nothing,
      $sel:httpStatus:GetImportResponse' :: Int
httpStatus = Int
pHttpStatus_
    }

-- | A timestamp for the date and time that the import job was created.
getImportResponse_createdDate :: Lens.Lens' GetImportResponse (Prelude.Maybe Prelude.UTCTime)
getImportResponse_createdDate :: Lens' GetImportResponse (Maybe UTCTime)
getImportResponse_createdDate = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetImportResponse' {Maybe POSIX
createdDate :: Maybe POSIX
$sel:createdDate:GetImportResponse' :: GetImportResponse -> Maybe POSIX
createdDate} -> Maybe POSIX
createdDate) (\s :: GetImportResponse
s@GetImportResponse' {} Maybe POSIX
a -> GetImportResponse
s {$sel:createdDate:GetImportResponse' :: Maybe POSIX
createdDate = Maybe POSIX
a} :: GetImportResponse) 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 :: Format). Iso' (Time a) UTCTime
Data._Time

-- | A string that describes why an import job failed to complete.
getImportResponse_failureReason :: Lens.Lens' GetImportResponse (Prelude.Maybe [Prelude.Text])
getImportResponse_failureReason :: Lens' GetImportResponse (Maybe [Text])
getImportResponse_failureReason = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetImportResponse' {Maybe [Text]
failureReason :: Maybe [Text]
$sel:failureReason:GetImportResponse' :: GetImportResponse -> Maybe [Text]
failureReason} -> Maybe [Text]
failureReason) (\s :: GetImportResponse
s@GetImportResponse' {} Maybe [Text]
a -> GetImportResponse
s {$sel:failureReason:GetImportResponse' :: Maybe [Text]
failureReason = Maybe [Text]
a} :: GetImportResponse) 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 identifier for the specific import job.
getImportResponse_importId :: Lens.Lens' GetImportResponse (Prelude.Maybe Prelude.Text)
getImportResponse_importId :: Lens' GetImportResponse (Maybe Text)
getImportResponse_importId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetImportResponse' {Maybe Text
importId :: Maybe Text
$sel:importId:GetImportResponse' :: GetImportResponse -> Maybe Text
importId} -> Maybe Text
importId) (\s :: GetImportResponse
s@GetImportResponse' {} Maybe Text
a -> GetImportResponse
s {$sel:importId:GetImportResponse' :: Maybe Text
importId = Maybe Text
a} :: GetImportResponse)

-- | The status of the import job. If the status is @FAILED@, you can get the
-- reason for the failure from the @failureReason@ field.
getImportResponse_importStatus :: Lens.Lens' GetImportResponse (Prelude.Maybe ImportStatus)
getImportResponse_importStatus :: Lens' GetImportResponse (Maybe ImportStatus)
getImportResponse_importStatus = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetImportResponse' {Maybe ImportStatus
importStatus :: Maybe ImportStatus
$sel:importStatus:GetImportResponse' :: GetImportResponse -> Maybe ImportStatus
importStatus} -> Maybe ImportStatus
importStatus) (\s :: GetImportResponse
s@GetImportResponse' {} Maybe ImportStatus
a -> GetImportResponse
s {$sel:importStatus:GetImportResponse' :: Maybe ImportStatus
importStatus = Maybe ImportStatus
a} :: GetImportResponse)

-- | The action taken when there was a conflict between an existing resource
-- and a resource in the import file.
getImportResponse_mergeStrategy :: Lens.Lens' GetImportResponse (Prelude.Maybe MergeStrategy)
getImportResponse_mergeStrategy :: Lens' GetImportResponse (Maybe MergeStrategy)
getImportResponse_mergeStrategy = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetImportResponse' {Maybe MergeStrategy
mergeStrategy :: Maybe MergeStrategy
$sel:mergeStrategy:GetImportResponse' :: GetImportResponse -> Maybe MergeStrategy
mergeStrategy} -> Maybe MergeStrategy
mergeStrategy) (\s :: GetImportResponse
s@GetImportResponse' {} Maybe MergeStrategy
a -> GetImportResponse
s {$sel:mergeStrategy:GetImportResponse' :: Maybe MergeStrategy
mergeStrategy = Maybe MergeStrategy
a} :: GetImportResponse)

-- | The name given to the import job.
getImportResponse_name :: Lens.Lens' GetImportResponse (Prelude.Maybe Prelude.Text)
getImportResponse_name :: Lens' GetImportResponse (Maybe Text)
getImportResponse_name = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetImportResponse' {Maybe Text
name :: Maybe Text
$sel:name:GetImportResponse' :: GetImportResponse -> Maybe Text
name} -> Maybe Text
name) (\s :: GetImportResponse
s@GetImportResponse' {} Maybe Text
a -> GetImportResponse
s {$sel:name:GetImportResponse' :: Maybe Text
name = Maybe Text
a} :: GetImportResponse)

-- | The type of resource imported.
getImportResponse_resourceType :: Lens.Lens' GetImportResponse (Prelude.Maybe ResourceType)
getImportResponse_resourceType :: Lens' GetImportResponse (Maybe ResourceType)
getImportResponse_resourceType = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetImportResponse' {Maybe ResourceType
resourceType :: Maybe ResourceType
$sel:resourceType:GetImportResponse' :: GetImportResponse -> Maybe ResourceType
resourceType} -> Maybe ResourceType
resourceType) (\s :: GetImportResponse
s@GetImportResponse' {} Maybe ResourceType
a -> GetImportResponse
s {$sel:resourceType:GetImportResponse' :: Maybe ResourceType
resourceType = Maybe ResourceType
a} :: GetImportResponse)

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

instance Prelude.NFData GetImportResponse where
  rnf :: GetImportResponse -> ()
rnf GetImportResponse' {Int
Maybe [Text]
Maybe Text
Maybe POSIX
Maybe ImportStatus
Maybe MergeStrategy
Maybe ResourceType
httpStatus :: Int
resourceType :: Maybe ResourceType
name :: Maybe Text
mergeStrategy :: Maybe MergeStrategy
importStatus :: Maybe ImportStatus
importId :: Maybe Text
failureReason :: Maybe [Text]
createdDate :: Maybe POSIX
$sel:httpStatus:GetImportResponse' :: GetImportResponse -> Int
$sel:resourceType:GetImportResponse' :: GetImportResponse -> Maybe ResourceType
$sel:name:GetImportResponse' :: GetImportResponse -> Maybe Text
$sel:mergeStrategy:GetImportResponse' :: GetImportResponse -> Maybe MergeStrategy
$sel:importStatus:GetImportResponse' :: GetImportResponse -> Maybe ImportStatus
$sel:importId:GetImportResponse' :: GetImportResponse -> Maybe Text
$sel:failureReason:GetImportResponse' :: GetImportResponse -> Maybe [Text]
$sel:createdDate:GetImportResponse' :: GetImportResponse -> Maybe POSIX
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe POSIX
createdDate
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [Text]
failureReason
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
importId
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe ImportStatus
importStatus
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe MergeStrategy
mergeStrategy
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
name
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe ResourceType
resourceType
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Int
httpStatus