{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE DuplicateRecordFields #-}
{-# LANGUAGE NamedFieldPuns #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE RecordWildCards #-}
{-# LANGUAGE StrictData #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
{-# OPTIONS_GHC -fno-warn-unused-matches #-}

-- Derived from AWS service descriptions, licensed under Apache 2.0.

-- |
-- Module      : Amazonka.IoTJobsData.Types.JobExecution
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
module Amazonka.IoTJobsData.Types.JobExecution where

import qualified Amazonka.Core as Core
import qualified Amazonka.Core.Lens.Internal as Lens
import qualified Amazonka.Data as Data
import Amazonka.IoTJobsData.Types.JobExecutionStatus
import qualified Amazonka.Prelude as Prelude

-- | Contains data about a job execution.
--
-- /See:/ 'newJobExecution' smart constructor.
data JobExecution = JobExecution'
  { -- | The estimated number of seconds that remain before the job execution
    -- status will be changed to @TIMED_OUT@.
    JobExecution -> Maybe Integer
approximateSecondsBeforeTimedOut :: Prelude.Maybe Prelude.Integer,
    -- | A number that identifies a particular job execution on a particular
    -- device. It can be used later in commands that return or update job
    -- execution information.
    JobExecution -> Maybe Integer
executionNumber :: Prelude.Maybe Prelude.Integer,
    -- | The content of the job document.
    JobExecution -> Maybe Text
jobDocument :: Prelude.Maybe Prelude.Text,
    -- | The unique identifier you assigned to this job when it was created.
    JobExecution -> Maybe Text
jobId :: Prelude.Maybe Prelude.Text,
    -- | The time, in milliseconds since the epoch, when the job execution was
    -- last updated.
    JobExecution -> Maybe Integer
lastUpdatedAt :: Prelude.Maybe Prelude.Integer,
    -- | The time, in milliseconds since the epoch, when the job execution was
    -- enqueued.
    JobExecution -> Maybe Integer
queuedAt :: Prelude.Maybe Prelude.Integer,
    -- | The time, in milliseconds since the epoch, when the job execution was
    -- started.
    JobExecution -> Maybe Integer
startedAt :: Prelude.Maybe Prelude.Integer,
    -- | The status of the job execution. Can be one of: \"QUEUED\",
    -- \"IN_PROGRESS\", \"FAILED\", \"SUCCESS\", \"CANCELED\", \"REJECTED\", or
    -- \"REMOVED\".
    JobExecution -> Maybe JobExecutionStatus
status :: Prelude.Maybe JobExecutionStatus,
    -- | A collection of name\/value pairs that describe the status of the job
    -- execution.
    JobExecution -> Maybe (HashMap Text Text)
statusDetails :: Prelude.Maybe (Prelude.HashMap Prelude.Text Prelude.Text),
    -- | The name of the thing that is executing the job.
    JobExecution -> Maybe Text
thingName :: Prelude.Maybe Prelude.Text,
    -- | The version of the job execution. Job execution versions are incremented
    -- each time they are updated by a device.
    JobExecution -> Maybe Integer
versionNumber :: Prelude.Maybe Prelude.Integer
  }
  deriving (JobExecution -> JobExecution -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: JobExecution -> JobExecution -> Bool
$c/= :: JobExecution -> JobExecution -> Bool
== :: JobExecution -> JobExecution -> Bool
$c== :: JobExecution -> JobExecution -> Bool
Prelude.Eq, ReadPrec [JobExecution]
ReadPrec JobExecution
Int -> ReadS JobExecution
ReadS [JobExecution]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [JobExecution]
$creadListPrec :: ReadPrec [JobExecution]
readPrec :: ReadPrec JobExecution
$creadPrec :: ReadPrec JobExecution
readList :: ReadS [JobExecution]
$creadList :: ReadS [JobExecution]
readsPrec :: Int -> ReadS JobExecution
$creadsPrec :: Int -> ReadS JobExecution
Prelude.Read, Int -> JobExecution -> ShowS
[JobExecution] -> ShowS
JobExecution -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [JobExecution] -> ShowS
$cshowList :: [JobExecution] -> ShowS
show :: JobExecution -> String
$cshow :: JobExecution -> String
showsPrec :: Int -> JobExecution -> ShowS
$cshowsPrec :: Int -> JobExecution -> ShowS
Prelude.Show, forall x. Rep JobExecution x -> JobExecution
forall x. JobExecution -> Rep JobExecution x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep JobExecution x -> JobExecution
$cfrom :: forall x. JobExecution -> Rep JobExecution x
Prelude.Generic)

-- |
-- Create a value of 'JobExecution' 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:
--
-- 'approximateSecondsBeforeTimedOut', 'jobExecution_approximateSecondsBeforeTimedOut' - The estimated number of seconds that remain before the job execution
-- status will be changed to @TIMED_OUT@.
--
-- 'executionNumber', 'jobExecution_executionNumber' - A number that identifies a particular job execution on a particular
-- device. It can be used later in commands that return or update job
-- execution information.
--
-- 'jobDocument', 'jobExecution_jobDocument' - The content of the job document.
--
-- 'jobId', 'jobExecution_jobId' - The unique identifier you assigned to this job when it was created.
--
-- 'lastUpdatedAt', 'jobExecution_lastUpdatedAt' - The time, in milliseconds since the epoch, when the job execution was
-- last updated.
--
-- 'queuedAt', 'jobExecution_queuedAt' - The time, in milliseconds since the epoch, when the job execution was
-- enqueued.
--
-- 'startedAt', 'jobExecution_startedAt' - The time, in milliseconds since the epoch, when the job execution was
-- started.
--
-- 'status', 'jobExecution_status' - The status of the job execution. Can be one of: \"QUEUED\",
-- \"IN_PROGRESS\", \"FAILED\", \"SUCCESS\", \"CANCELED\", \"REJECTED\", or
-- \"REMOVED\".
--
-- 'statusDetails', 'jobExecution_statusDetails' - A collection of name\/value pairs that describe the status of the job
-- execution.
--
-- 'thingName', 'jobExecution_thingName' - The name of the thing that is executing the job.
--
-- 'versionNumber', 'jobExecution_versionNumber' - The version of the job execution. Job execution versions are incremented
-- each time they are updated by a device.
newJobExecution ::
  JobExecution
newJobExecution :: JobExecution
newJobExecution =
  JobExecution'
    { $sel:approximateSecondsBeforeTimedOut:JobExecution' :: Maybe Integer
approximateSecondsBeforeTimedOut =
        forall a. Maybe a
Prelude.Nothing,
      $sel:executionNumber:JobExecution' :: Maybe Integer
executionNumber = forall a. Maybe a
Prelude.Nothing,
      $sel:jobDocument:JobExecution' :: Maybe Text
jobDocument = forall a. Maybe a
Prelude.Nothing,
      $sel:jobId:JobExecution' :: Maybe Text
jobId = forall a. Maybe a
Prelude.Nothing,
      $sel:lastUpdatedAt:JobExecution' :: Maybe Integer
lastUpdatedAt = forall a. Maybe a
Prelude.Nothing,
      $sel:queuedAt:JobExecution' :: Maybe Integer
queuedAt = forall a. Maybe a
Prelude.Nothing,
      $sel:startedAt:JobExecution' :: Maybe Integer
startedAt = forall a. Maybe a
Prelude.Nothing,
      $sel:status:JobExecution' :: Maybe JobExecutionStatus
status = forall a. Maybe a
Prelude.Nothing,
      $sel:statusDetails:JobExecution' :: Maybe (HashMap Text Text)
statusDetails = forall a. Maybe a
Prelude.Nothing,
      $sel:thingName:JobExecution' :: Maybe Text
thingName = forall a. Maybe a
Prelude.Nothing,
      $sel:versionNumber:JobExecution' :: Maybe Integer
versionNumber = forall a. Maybe a
Prelude.Nothing
    }

-- | The estimated number of seconds that remain before the job execution
-- status will be changed to @TIMED_OUT@.
jobExecution_approximateSecondsBeforeTimedOut :: Lens.Lens' JobExecution (Prelude.Maybe Prelude.Integer)
jobExecution_approximateSecondsBeforeTimedOut :: Lens' JobExecution (Maybe Integer)
jobExecution_approximateSecondsBeforeTimedOut = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\JobExecution' {Maybe Integer
approximateSecondsBeforeTimedOut :: Maybe Integer
$sel:approximateSecondsBeforeTimedOut:JobExecution' :: JobExecution -> Maybe Integer
approximateSecondsBeforeTimedOut} -> Maybe Integer
approximateSecondsBeforeTimedOut) (\s :: JobExecution
s@JobExecution' {} Maybe Integer
a -> JobExecution
s {$sel:approximateSecondsBeforeTimedOut:JobExecution' :: Maybe Integer
approximateSecondsBeforeTimedOut = Maybe Integer
a} :: JobExecution)

-- | A number that identifies a particular job execution on a particular
-- device. It can be used later in commands that return or update job
-- execution information.
jobExecution_executionNumber :: Lens.Lens' JobExecution (Prelude.Maybe Prelude.Integer)
jobExecution_executionNumber :: Lens' JobExecution (Maybe Integer)
jobExecution_executionNumber = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\JobExecution' {Maybe Integer
executionNumber :: Maybe Integer
$sel:executionNumber:JobExecution' :: JobExecution -> Maybe Integer
executionNumber} -> Maybe Integer
executionNumber) (\s :: JobExecution
s@JobExecution' {} Maybe Integer
a -> JobExecution
s {$sel:executionNumber:JobExecution' :: Maybe Integer
executionNumber = Maybe Integer
a} :: JobExecution)

-- | The content of the job document.
jobExecution_jobDocument :: Lens.Lens' JobExecution (Prelude.Maybe Prelude.Text)
jobExecution_jobDocument :: Lens' JobExecution (Maybe Text)
jobExecution_jobDocument = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\JobExecution' {Maybe Text
jobDocument :: Maybe Text
$sel:jobDocument:JobExecution' :: JobExecution -> Maybe Text
jobDocument} -> Maybe Text
jobDocument) (\s :: JobExecution
s@JobExecution' {} Maybe Text
a -> JobExecution
s {$sel:jobDocument:JobExecution' :: Maybe Text
jobDocument = Maybe Text
a} :: JobExecution)

-- | The unique identifier you assigned to this job when it was created.
jobExecution_jobId :: Lens.Lens' JobExecution (Prelude.Maybe Prelude.Text)
jobExecution_jobId :: Lens' JobExecution (Maybe Text)
jobExecution_jobId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\JobExecution' {Maybe Text
jobId :: Maybe Text
$sel:jobId:JobExecution' :: JobExecution -> Maybe Text
jobId} -> Maybe Text
jobId) (\s :: JobExecution
s@JobExecution' {} Maybe Text
a -> JobExecution
s {$sel:jobId:JobExecution' :: Maybe Text
jobId = Maybe Text
a} :: JobExecution)

-- | The time, in milliseconds since the epoch, when the job execution was
-- last updated.
jobExecution_lastUpdatedAt :: Lens.Lens' JobExecution (Prelude.Maybe Prelude.Integer)
jobExecution_lastUpdatedAt :: Lens' JobExecution (Maybe Integer)
jobExecution_lastUpdatedAt = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\JobExecution' {Maybe Integer
lastUpdatedAt :: Maybe Integer
$sel:lastUpdatedAt:JobExecution' :: JobExecution -> Maybe Integer
lastUpdatedAt} -> Maybe Integer
lastUpdatedAt) (\s :: JobExecution
s@JobExecution' {} Maybe Integer
a -> JobExecution
s {$sel:lastUpdatedAt:JobExecution' :: Maybe Integer
lastUpdatedAt = Maybe Integer
a} :: JobExecution)

-- | The time, in milliseconds since the epoch, when the job execution was
-- enqueued.
jobExecution_queuedAt :: Lens.Lens' JobExecution (Prelude.Maybe Prelude.Integer)
jobExecution_queuedAt :: Lens' JobExecution (Maybe Integer)
jobExecution_queuedAt = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\JobExecution' {Maybe Integer
queuedAt :: Maybe Integer
$sel:queuedAt:JobExecution' :: JobExecution -> Maybe Integer
queuedAt} -> Maybe Integer
queuedAt) (\s :: JobExecution
s@JobExecution' {} Maybe Integer
a -> JobExecution
s {$sel:queuedAt:JobExecution' :: Maybe Integer
queuedAt = Maybe Integer
a} :: JobExecution)

-- | The time, in milliseconds since the epoch, when the job execution was
-- started.
jobExecution_startedAt :: Lens.Lens' JobExecution (Prelude.Maybe Prelude.Integer)
jobExecution_startedAt :: Lens' JobExecution (Maybe Integer)
jobExecution_startedAt = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\JobExecution' {Maybe Integer
startedAt :: Maybe Integer
$sel:startedAt:JobExecution' :: JobExecution -> Maybe Integer
startedAt} -> Maybe Integer
startedAt) (\s :: JobExecution
s@JobExecution' {} Maybe Integer
a -> JobExecution
s {$sel:startedAt:JobExecution' :: Maybe Integer
startedAt = Maybe Integer
a} :: JobExecution)

-- | The status of the job execution. Can be one of: \"QUEUED\",
-- \"IN_PROGRESS\", \"FAILED\", \"SUCCESS\", \"CANCELED\", \"REJECTED\", or
-- \"REMOVED\".
jobExecution_status :: Lens.Lens' JobExecution (Prelude.Maybe JobExecutionStatus)
jobExecution_status :: Lens' JobExecution (Maybe JobExecutionStatus)
jobExecution_status = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\JobExecution' {Maybe JobExecutionStatus
status :: Maybe JobExecutionStatus
$sel:status:JobExecution' :: JobExecution -> Maybe JobExecutionStatus
status} -> Maybe JobExecutionStatus
status) (\s :: JobExecution
s@JobExecution' {} Maybe JobExecutionStatus
a -> JobExecution
s {$sel:status:JobExecution' :: Maybe JobExecutionStatus
status = Maybe JobExecutionStatus
a} :: JobExecution)

-- | A collection of name\/value pairs that describe the status of the job
-- execution.
jobExecution_statusDetails :: Lens.Lens' JobExecution (Prelude.Maybe (Prelude.HashMap Prelude.Text Prelude.Text))
jobExecution_statusDetails :: Lens' JobExecution (Maybe (HashMap Text Text))
jobExecution_statusDetails = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\JobExecution' {Maybe (HashMap Text Text)
statusDetails :: Maybe (HashMap Text Text)
$sel:statusDetails:JobExecution' :: JobExecution -> Maybe (HashMap Text Text)
statusDetails} -> Maybe (HashMap Text Text)
statusDetails) (\s :: JobExecution
s@JobExecution' {} Maybe (HashMap Text Text)
a -> JobExecution
s {$sel:statusDetails:JobExecution' :: Maybe (HashMap Text Text)
statusDetails = Maybe (HashMap Text Text)
a} :: JobExecution) 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 name of the thing that is executing the job.
jobExecution_thingName :: Lens.Lens' JobExecution (Prelude.Maybe Prelude.Text)
jobExecution_thingName :: Lens' JobExecution (Maybe Text)
jobExecution_thingName = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\JobExecution' {Maybe Text
thingName :: Maybe Text
$sel:thingName:JobExecution' :: JobExecution -> Maybe Text
thingName} -> Maybe Text
thingName) (\s :: JobExecution
s@JobExecution' {} Maybe Text
a -> JobExecution
s {$sel:thingName:JobExecution' :: Maybe Text
thingName = Maybe Text
a} :: JobExecution)

-- | The version of the job execution. Job execution versions are incremented
-- each time they are updated by a device.
jobExecution_versionNumber :: Lens.Lens' JobExecution (Prelude.Maybe Prelude.Integer)
jobExecution_versionNumber :: Lens' JobExecution (Maybe Integer)
jobExecution_versionNumber = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\JobExecution' {Maybe Integer
versionNumber :: Maybe Integer
$sel:versionNumber:JobExecution' :: JobExecution -> Maybe Integer
versionNumber} -> Maybe Integer
versionNumber) (\s :: JobExecution
s@JobExecution' {} Maybe Integer
a -> JobExecution
s {$sel:versionNumber:JobExecution' :: Maybe Integer
versionNumber = Maybe Integer
a} :: JobExecution)

instance Data.FromJSON JobExecution where
  parseJSON :: Value -> Parser JobExecution
parseJSON =
    forall a. String -> (Object -> Parser a) -> Value -> Parser a
Data.withObject
      String
"JobExecution"
      ( \Object
x ->
          Maybe Integer
-> Maybe Integer
-> Maybe Text
-> Maybe Text
-> Maybe Integer
-> Maybe Integer
-> Maybe Integer
-> Maybe JobExecutionStatus
-> Maybe (HashMap Text Text)
-> Maybe Text
-> Maybe Integer
-> JobExecution
JobExecution'
            forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"approximateSecondsBeforeTimedOut")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"executionNumber")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"jobDocument")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (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 -> Parser (Maybe a)
Data..:? Key
"lastUpdatedAt")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"queuedAt")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"startedAt")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (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 -> Parser (Maybe a)
Data..:? Key
"statusDetails" forall a. Parser (Maybe a) -> a -> Parser a
Data..!= 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 -> Parser (Maybe a)
Data..:? Key
"thingName")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"versionNumber")
      )

instance Prelude.Hashable JobExecution where
  hashWithSalt :: Int -> JobExecution -> Int
hashWithSalt Int
_salt JobExecution' {Maybe Integer
Maybe Text
Maybe (HashMap Text Text)
Maybe JobExecutionStatus
versionNumber :: Maybe Integer
thingName :: Maybe Text
statusDetails :: Maybe (HashMap Text Text)
status :: Maybe JobExecutionStatus
startedAt :: Maybe Integer
queuedAt :: Maybe Integer
lastUpdatedAt :: Maybe Integer
jobId :: Maybe Text
jobDocument :: Maybe Text
executionNumber :: Maybe Integer
approximateSecondsBeforeTimedOut :: Maybe Integer
$sel:versionNumber:JobExecution' :: JobExecution -> Maybe Integer
$sel:thingName:JobExecution' :: JobExecution -> Maybe Text
$sel:statusDetails:JobExecution' :: JobExecution -> Maybe (HashMap Text Text)
$sel:status:JobExecution' :: JobExecution -> Maybe JobExecutionStatus
$sel:startedAt:JobExecution' :: JobExecution -> Maybe Integer
$sel:queuedAt:JobExecution' :: JobExecution -> Maybe Integer
$sel:lastUpdatedAt:JobExecution' :: JobExecution -> Maybe Integer
$sel:jobId:JobExecution' :: JobExecution -> Maybe Text
$sel:jobDocument:JobExecution' :: JobExecution -> Maybe Text
$sel:executionNumber:JobExecution' :: JobExecution -> Maybe Integer
$sel:approximateSecondsBeforeTimedOut:JobExecution' :: JobExecution -> Maybe Integer
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Integer
approximateSecondsBeforeTimedOut
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Integer
executionNumber
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
jobDocument
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
jobId
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Integer
lastUpdatedAt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Integer
queuedAt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Integer
startedAt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe JobExecutionStatus
status
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe (HashMap Text Text)
statusDetails
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
thingName
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Integer
versionNumber

instance Prelude.NFData JobExecution where
  rnf :: JobExecution -> ()
rnf JobExecution' {Maybe Integer
Maybe Text
Maybe (HashMap Text Text)
Maybe JobExecutionStatus
versionNumber :: Maybe Integer
thingName :: Maybe Text
statusDetails :: Maybe (HashMap Text Text)
status :: Maybe JobExecutionStatus
startedAt :: Maybe Integer
queuedAt :: Maybe Integer
lastUpdatedAt :: Maybe Integer
jobId :: Maybe Text
jobDocument :: Maybe Text
executionNumber :: Maybe Integer
approximateSecondsBeforeTimedOut :: Maybe Integer
$sel:versionNumber:JobExecution' :: JobExecution -> Maybe Integer
$sel:thingName:JobExecution' :: JobExecution -> Maybe Text
$sel:statusDetails:JobExecution' :: JobExecution -> Maybe (HashMap Text Text)
$sel:status:JobExecution' :: JobExecution -> Maybe JobExecutionStatus
$sel:startedAt:JobExecution' :: JobExecution -> Maybe Integer
$sel:queuedAt:JobExecution' :: JobExecution -> Maybe Integer
$sel:lastUpdatedAt:JobExecution' :: JobExecution -> Maybe Integer
$sel:jobId:JobExecution' :: JobExecution -> Maybe Text
$sel:jobDocument:JobExecution' :: JobExecution -> Maybe Text
$sel:executionNumber:JobExecution' :: JobExecution -> Maybe Integer
$sel:approximateSecondsBeforeTimedOut:JobExecution' :: JobExecution -> Maybe Integer
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Integer
approximateSecondsBeforeTimedOut
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Integer
executionNumber
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
jobDocument
      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 Integer
lastUpdatedAt
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Integer
queuedAt
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Integer
startedAt
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe JobExecutionStatus
status
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe (HashMap Text Text)
statusDetails
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
thingName
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Integer
versionNumber