{-# 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.AmplifyBackend.GetBackendJob
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
--
-- Returns information about a specific job.
module Amazonka.AmplifyBackend.GetBackendJob
  ( -- * Creating a Request
    GetBackendJob (..),
    newGetBackendJob,

    -- * Request Lenses
    getBackendJob_appId,
    getBackendJob_backendEnvironmentName,
    getBackendJob_jobId,

    -- * Destructuring the Response
    GetBackendJobResponse (..),
    newGetBackendJobResponse,

    -- * Response Lenses
    getBackendJobResponse_appId,
    getBackendJobResponse_backendEnvironmentName,
    getBackendJobResponse_createTime,
    getBackendJobResponse_error,
    getBackendJobResponse_jobId,
    getBackendJobResponse_operation,
    getBackendJobResponse_status,
    getBackendJobResponse_updateTime,
    getBackendJobResponse_httpStatus,
  )
where

import Amazonka.AmplifyBackend.Types
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

-- | /See:/ 'newGetBackendJob' smart constructor.
data GetBackendJob = GetBackendJob'
  { -- | The app ID.
    GetBackendJob -> Text
appId :: Prelude.Text,
    -- | The name of the backend environment.
    GetBackendJob -> Text
backendEnvironmentName :: Prelude.Text,
    -- | The ID for the job.
    GetBackendJob -> Text
jobId :: Prelude.Text
  }
  deriving (GetBackendJob -> GetBackendJob -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: GetBackendJob -> GetBackendJob -> Bool
$c/= :: GetBackendJob -> GetBackendJob -> Bool
== :: GetBackendJob -> GetBackendJob -> Bool
$c== :: GetBackendJob -> GetBackendJob -> Bool
Prelude.Eq, ReadPrec [GetBackendJob]
ReadPrec GetBackendJob
Int -> ReadS GetBackendJob
ReadS [GetBackendJob]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [GetBackendJob]
$creadListPrec :: ReadPrec [GetBackendJob]
readPrec :: ReadPrec GetBackendJob
$creadPrec :: ReadPrec GetBackendJob
readList :: ReadS [GetBackendJob]
$creadList :: ReadS [GetBackendJob]
readsPrec :: Int -> ReadS GetBackendJob
$creadsPrec :: Int -> ReadS GetBackendJob
Prelude.Read, Int -> GetBackendJob -> ShowS
[GetBackendJob] -> ShowS
GetBackendJob -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [GetBackendJob] -> ShowS
$cshowList :: [GetBackendJob] -> ShowS
show :: GetBackendJob -> String
$cshow :: GetBackendJob -> String
showsPrec :: Int -> GetBackendJob -> ShowS
$cshowsPrec :: Int -> GetBackendJob -> ShowS
Prelude.Show, forall x. Rep GetBackendJob x -> GetBackendJob
forall x. GetBackendJob -> Rep GetBackendJob x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep GetBackendJob x -> GetBackendJob
$cfrom :: forall x. GetBackendJob -> Rep GetBackendJob x
Prelude.Generic)

-- |
-- Create a value of 'GetBackendJob' 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:
--
-- 'appId', 'getBackendJob_appId' - The app ID.
--
-- 'backendEnvironmentName', 'getBackendJob_backendEnvironmentName' - The name of the backend environment.
--
-- 'jobId', 'getBackendJob_jobId' - The ID for the job.
newGetBackendJob ::
  -- | 'appId'
  Prelude.Text ->
  -- | 'backendEnvironmentName'
  Prelude.Text ->
  -- | 'jobId'
  Prelude.Text ->
  GetBackendJob
newGetBackendJob :: Text -> Text -> Text -> GetBackendJob
newGetBackendJob
  Text
pAppId_
  Text
pBackendEnvironmentName_
  Text
pJobId_ =
    GetBackendJob'
      { $sel:appId:GetBackendJob' :: Text
appId = Text
pAppId_,
        $sel:backendEnvironmentName:GetBackendJob' :: Text
backendEnvironmentName = Text
pBackendEnvironmentName_,
        $sel:jobId:GetBackendJob' :: Text
jobId = Text
pJobId_
      }

-- | The app ID.
getBackendJob_appId :: Lens.Lens' GetBackendJob Prelude.Text
getBackendJob_appId :: Lens' GetBackendJob Text
getBackendJob_appId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetBackendJob' {Text
appId :: Text
$sel:appId:GetBackendJob' :: GetBackendJob -> Text
appId} -> Text
appId) (\s :: GetBackendJob
s@GetBackendJob' {} Text
a -> GetBackendJob
s {$sel:appId:GetBackendJob' :: Text
appId = Text
a} :: GetBackendJob)

-- | The name of the backend environment.
getBackendJob_backendEnvironmentName :: Lens.Lens' GetBackendJob Prelude.Text
getBackendJob_backendEnvironmentName :: Lens' GetBackendJob Text
getBackendJob_backendEnvironmentName = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetBackendJob' {Text
backendEnvironmentName :: Text
$sel:backendEnvironmentName:GetBackendJob' :: GetBackendJob -> Text
backendEnvironmentName} -> Text
backendEnvironmentName) (\s :: GetBackendJob
s@GetBackendJob' {} Text
a -> GetBackendJob
s {$sel:backendEnvironmentName:GetBackendJob' :: Text
backendEnvironmentName = Text
a} :: GetBackendJob)

-- | The ID for the job.
getBackendJob_jobId :: Lens.Lens' GetBackendJob Prelude.Text
getBackendJob_jobId :: Lens' GetBackendJob Text
getBackendJob_jobId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetBackendJob' {Text
jobId :: Text
$sel:jobId:GetBackendJob' :: GetBackendJob -> Text
jobId} -> Text
jobId) (\s :: GetBackendJob
s@GetBackendJob' {} Text
a -> GetBackendJob
s {$sel:jobId:GetBackendJob' :: Text
jobId = Text
a} :: GetBackendJob)

instance Core.AWSRequest GetBackendJob where
  type
    AWSResponse GetBackendJob =
      GetBackendJobResponse
  request :: (Service -> Service) -> GetBackendJob -> Request GetBackendJob
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 GetBackendJob
-> ClientResponse ClientBody
-> m (Either Error (ClientResponse (AWSResponse GetBackendJob)))
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 Text
-> Maybe Text
-> Maybe Text
-> Maybe Text
-> Maybe Text
-> Maybe Text
-> Maybe Text
-> Maybe Text
-> Int
-> GetBackendJobResponse
GetBackendJobResponse'
            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
"appId")
            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
"backendEnvironmentName")
            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
"createTime")
            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
"error")
            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
"jobId")
            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
"operation")
            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
"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 (Maybe a)
Data..?> Key
"updateTime")
            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 GetBackendJob where
  hashWithSalt :: Int -> GetBackendJob -> Int
hashWithSalt Int
_salt GetBackendJob' {Text
jobId :: Text
backendEnvironmentName :: Text
appId :: Text
$sel:jobId:GetBackendJob' :: GetBackendJob -> Text
$sel:backendEnvironmentName:GetBackendJob' :: GetBackendJob -> Text
$sel:appId:GetBackendJob' :: GetBackendJob -> Text
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
appId
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
backendEnvironmentName
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
jobId

instance Prelude.NFData GetBackendJob where
  rnf :: GetBackendJob -> ()
rnf GetBackendJob' {Text
jobId :: Text
backendEnvironmentName :: Text
appId :: Text
$sel:jobId:GetBackendJob' :: GetBackendJob -> Text
$sel:backendEnvironmentName:GetBackendJob' :: GetBackendJob -> Text
$sel:appId:GetBackendJob' :: GetBackendJob -> Text
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Text
appId
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Text
backendEnvironmentName
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Text
jobId

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

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

-- | /See:/ 'newGetBackendJobResponse' smart constructor.
data GetBackendJobResponse = GetBackendJobResponse'
  { -- | The app ID.
    GetBackendJobResponse -> Maybe Text
appId :: Prelude.Maybe Prelude.Text,
    -- | The name of the backend environment.
    GetBackendJobResponse -> Maybe Text
backendEnvironmentName :: Prelude.Maybe Prelude.Text,
    -- | The time when the job was created.
    GetBackendJobResponse -> Maybe Text
createTime :: Prelude.Maybe Prelude.Text,
    -- | If the request fails, this error is returned.
    GetBackendJobResponse -> Maybe Text
error :: Prelude.Maybe Prelude.Text,
    -- | The ID for the job.
    GetBackendJobResponse -> Maybe Text
jobId :: Prelude.Maybe Prelude.Text,
    -- | The name of the operation.
    GetBackendJobResponse -> Maybe Text
operation :: Prelude.Maybe Prelude.Text,
    -- | The current status of the request.
    GetBackendJobResponse -> Maybe Text
status :: Prelude.Maybe Prelude.Text,
    -- | The time when the job was last updated.
    GetBackendJobResponse -> Maybe Text
updateTime :: Prelude.Maybe Prelude.Text,
    -- | The response's http status code.
    GetBackendJobResponse -> Int
httpStatus :: Prelude.Int
  }
  deriving (GetBackendJobResponse -> GetBackendJobResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: GetBackendJobResponse -> GetBackendJobResponse -> Bool
$c/= :: GetBackendJobResponse -> GetBackendJobResponse -> Bool
== :: GetBackendJobResponse -> GetBackendJobResponse -> Bool
$c== :: GetBackendJobResponse -> GetBackendJobResponse -> Bool
Prelude.Eq, ReadPrec [GetBackendJobResponse]
ReadPrec GetBackendJobResponse
Int -> ReadS GetBackendJobResponse
ReadS [GetBackendJobResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [GetBackendJobResponse]
$creadListPrec :: ReadPrec [GetBackendJobResponse]
readPrec :: ReadPrec GetBackendJobResponse
$creadPrec :: ReadPrec GetBackendJobResponse
readList :: ReadS [GetBackendJobResponse]
$creadList :: ReadS [GetBackendJobResponse]
readsPrec :: Int -> ReadS GetBackendJobResponse
$creadsPrec :: Int -> ReadS GetBackendJobResponse
Prelude.Read, Int -> GetBackendJobResponse -> ShowS
[GetBackendJobResponse] -> ShowS
GetBackendJobResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [GetBackendJobResponse] -> ShowS
$cshowList :: [GetBackendJobResponse] -> ShowS
show :: GetBackendJobResponse -> String
$cshow :: GetBackendJobResponse -> String
showsPrec :: Int -> GetBackendJobResponse -> ShowS
$cshowsPrec :: Int -> GetBackendJobResponse -> ShowS
Prelude.Show, forall x. Rep GetBackendJobResponse x -> GetBackendJobResponse
forall x. GetBackendJobResponse -> Rep GetBackendJobResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep GetBackendJobResponse x -> GetBackendJobResponse
$cfrom :: forall x. GetBackendJobResponse -> Rep GetBackendJobResponse x
Prelude.Generic)

-- |
-- Create a value of 'GetBackendJobResponse' 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:
--
-- 'appId', 'getBackendJobResponse_appId' - The app ID.
--
-- 'backendEnvironmentName', 'getBackendJobResponse_backendEnvironmentName' - The name of the backend environment.
--
-- 'createTime', 'getBackendJobResponse_createTime' - The time when the job was created.
--
-- 'error', 'getBackendJobResponse_error' - If the request fails, this error is returned.
--
-- 'jobId', 'getBackendJobResponse_jobId' - The ID for the job.
--
-- 'operation', 'getBackendJobResponse_operation' - The name of the operation.
--
-- 'status', 'getBackendJobResponse_status' - The current status of the request.
--
-- 'updateTime', 'getBackendJobResponse_updateTime' - The time when the job was last updated.
--
-- 'httpStatus', 'getBackendJobResponse_httpStatus' - The response's http status code.
newGetBackendJobResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  GetBackendJobResponse
newGetBackendJobResponse :: Int -> GetBackendJobResponse
newGetBackendJobResponse Int
pHttpStatus_ =
  GetBackendJobResponse'
    { $sel:appId:GetBackendJobResponse' :: Maybe Text
appId = forall a. Maybe a
Prelude.Nothing,
      $sel:backendEnvironmentName:GetBackendJobResponse' :: Maybe Text
backendEnvironmentName = forall a. Maybe a
Prelude.Nothing,
      $sel:createTime:GetBackendJobResponse' :: Maybe Text
createTime = forall a. Maybe a
Prelude.Nothing,
      $sel:error:GetBackendJobResponse' :: Maybe Text
error = forall a. Maybe a
Prelude.Nothing,
      $sel:jobId:GetBackendJobResponse' :: Maybe Text
jobId = forall a. Maybe a
Prelude.Nothing,
      $sel:operation:GetBackendJobResponse' :: Maybe Text
operation = forall a. Maybe a
Prelude.Nothing,
      $sel:status:GetBackendJobResponse' :: Maybe Text
status = forall a. Maybe a
Prelude.Nothing,
      $sel:updateTime:GetBackendJobResponse' :: Maybe Text
updateTime = forall a. Maybe a
Prelude.Nothing,
      $sel:httpStatus:GetBackendJobResponse' :: Int
httpStatus = Int
pHttpStatus_
    }

-- | The app ID.
getBackendJobResponse_appId :: Lens.Lens' GetBackendJobResponse (Prelude.Maybe Prelude.Text)
getBackendJobResponse_appId :: Lens' GetBackendJobResponse (Maybe Text)
getBackendJobResponse_appId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetBackendJobResponse' {Maybe Text
appId :: Maybe Text
$sel:appId:GetBackendJobResponse' :: GetBackendJobResponse -> Maybe Text
appId} -> Maybe Text
appId) (\s :: GetBackendJobResponse
s@GetBackendJobResponse' {} Maybe Text
a -> GetBackendJobResponse
s {$sel:appId:GetBackendJobResponse' :: Maybe Text
appId = Maybe Text
a} :: GetBackendJobResponse)

-- | The name of the backend environment.
getBackendJobResponse_backendEnvironmentName :: Lens.Lens' GetBackendJobResponse (Prelude.Maybe Prelude.Text)
getBackendJobResponse_backendEnvironmentName :: Lens' GetBackendJobResponse (Maybe Text)
getBackendJobResponse_backendEnvironmentName = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetBackendJobResponse' {Maybe Text
backendEnvironmentName :: Maybe Text
$sel:backendEnvironmentName:GetBackendJobResponse' :: GetBackendJobResponse -> Maybe Text
backendEnvironmentName} -> Maybe Text
backendEnvironmentName) (\s :: GetBackendJobResponse
s@GetBackendJobResponse' {} Maybe Text
a -> GetBackendJobResponse
s {$sel:backendEnvironmentName:GetBackendJobResponse' :: Maybe Text
backendEnvironmentName = Maybe Text
a} :: GetBackendJobResponse)

-- | The time when the job was created.
getBackendJobResponse_createTime :: Lens.Lens' GetBackendJobResponse (Prelude.Maybe Prelude.Text)
getBackendJobResponse_createTime :: Lens' GetBackendJobResponse (Maybe Text)
getBackendJobResponse_createTime = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetBackendJobResponse' {Maybe Text
createTime :: Maybe Text
$sel:createTime:GetBackendJobResponse' :: GetBackendJobResponse -> Maybe Text
createTime} -> Maybe Text
createTime) (\s :: GetBackendJobResponse
s@GetBackendJobResponse' {} Maybe Text
a -> GetBackendJobResponse
s {$sel:createTime:GetBackendJobResponse' :: Maybe Text
createTime = Maybe Text
a} :: GetBackendJobResponse)

-- | If the request fails, this error is returned.
getBackendJobResponse_error :: Lens.Lens' GetBackendJobResponse (Prelude.Maybe Prelude.Text)
getBackendJobResponse_error :: Lens' GetBackendJobResponse (Maybe Text)
getBackendJobResponse_error = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetBackendJobResponse' {Maybe Text
error :: Maybe Text
$sel:error:GetBackendJobResponse' :: GetBackendJobResponse -> Maybe Text
error} -> Maybe Text
error) (\s :: GetBackendJobResponse
s@GetBackendJobResponse' {} Maybe Text
a -> GetBackendJobResponse
s {$sel:error:GetBackendJobResponse' :: Maybe Text
error = Maybe Text
a} :: GetBackendJobResponse)

-- | The ID for the job.
getBackendJobResponse_jobId :: Lens.Lens' GetBackendJobResponse (Prelude.Maybe Prelude.Text)
getBackendJobResponse_jobId :: Lens' GetBackendJobResponse (Maybe Text)
getBackendJobResponse_jobId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetBackendJobResponse' {Maybe Text
jobId :: Maybe Text
$sel:jobId:GetBackendJobResponse' :: GetBackendJobResponse -> Maybe Text
jobId} -> Maybe Text
jobId) (\s :: GetBackendJobResponse
s@GetBackendJobResponse' {} Maybe Text
a -> GetBackendJobResponse
s {$sel:jobId:GetBackendJobResponse' :: Maybe Text
jobId = Maybe Text
a} :: GetBackendJobResponse)

-- | The name of the operation.
getBackendJobResponse_operation :: Lens.Lens' GetBackendJobResponse (Prelude.Maybe Prelude.Text)
getBackendJobResponse_operation :: Lens' GetBackendJobResponse (Maybe Text)
getBackendJobResponse_operation = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetBackendJobResponse' {Maybe Text
operation :: Maybe Text
$sel:operation:GetBackendJobResponse' :: GetBackendJobResponse -> Maybe Text
operation} -> Maybe Text
operation) (\s :: GetBackendJobResponse
s@GetBackendJobResponse' {} Maybe Text
a -> GetBackendJobResponse
s {$sel:operation:GetBackendJobResponse' :: Maybe Text
operation = Maybe Text
a} :: GetBackendJobResponse)

-- | The current status of the request.
getBackendJobResponse_status :: Lens.Lens' GetBackendJobResponse (Prelude.Maybe Prelude.Text)
getBackendJobResponse_status :: Lens' GetBackendJobResponse (Maybe Text)
getBackendJobResponse_status = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetBackendJobResponse' {Maybe Text
status :: Maybe Text
$sel:status:GetBackendJobResponse' :: GetBackendJobResponse -> Maybe Text
status} -> Maybe Text
status) (\s :: GetBackendJobResponse
s@GetBackendJobResponse' {} Maybe Text
a -> GetBackendJobResponse
s {$sel:status:GetBackendJobResponse' :: Maybe Text
status = Maybe Text
a} :: GetBackendJobResponse)

-- | The time when the job was last updated.
getBackendJobResponse_updateTime :: Lens.Lens' GetBackendJobResponse (Prelude.Maybe Prelude.Text)
getBackendJobResponse_updateTime :: Lens' GetBackendJobResponse (Maybe Text)
getBackendJobResponse_updateTime = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetBackendJobResponse' {Maybe Text
updateTime :: Maybe Text
$sel:updateTime:GetBackendJobResponse' :: GetBackendJobResponse -> Maybe Text
updateTime} -> Maybe Text
updateTime) (\s :: GetBackendJobResponse
s@GetBackendJobResponse' {} Maybe Text
a -> GetBackendJobResponse
s {$sel:updateTime:GetBackendJobResponse' :: Maybe Text
updateTime = Maybe Text
a} :: GetBackendJobResponse)

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

instance Prelude.NFData GetBackendJobResponse where
  rnf :: GetBackendJobResponse -> ()
rnf GetBackendJobResponse' {Int
Maybe Text
httpStatus :: Int
updateTime :: Maybe Text
status :: Maybe Text
operation :: Maybe Text
jobId :: Maybe Text
error :: Maybe Text
createTime :: Maybe Text
backendEnvironmentName :: Maybe Text
appId :: Maybe Text
$sel:httpStatus:GetBackendJobResponse' :: GetBackendJobResponse -> Int
$sel:updateTime:GetBackendJobResponse' :: GetBackendJobResponse -> Maybe Text
$sel:status:GetBackendJobResponse' :: GetBackendJobResponse -> Maybe Text
$sel:operation:GetBackendJobResponse' :: GetBackendJobResponse -> Maybe Text
$sel:jobId:GetBackendJobResponse' :: GetBackendJobResponse -> Maybe Text
$sel:error:GetBackendJobResponse' :: GetBackendJobResponse -> Maybe Text
$sel:createTime:GetBackendJobResponse' :: GetBackendJobResponse -> Maybe Text
$sel:backendEnvironmentName:GetBackendJobResponse' :: GetBackendJobResponse -> Maybe Text
$sel:appId:GetBackendJobResponse' :: GetBackendJobResponse -> Maybe Text
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
appId
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
backendEnvironmentName
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
createTime
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
error
      seq :: forall a b. a -> b -> b
`Prelude.seq` 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 Text
operation
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
status
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
updateTime
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Int
httpStatus