{-# 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.CodePipeline.Types.ActionExecution
-- 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.CodePipeline.Types.ActionExecution where

import Amazonka.CodePipeline.Types.ActionExecutionStatus
import Amazonka.CodePipeline.Types.ErrorDetails
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

-- | Represents information about the run of an action.
--
-- /See:/ 'newActionExecution' smart constructor.
data ActionExecution = ActionExecution'
  { -- | ID of the workflow action execution in the current stage. Use the
    -- GetPipelineState action to retrieve the current action execution details
    -- of the current stage.
    --
    -- For older executions, this field might be empty. The action execution ID
    -- is available for executions run on or after March 2020.
    ActionExecution -> Maybe Text
actionExecutionId :: Prelude.Maybe Prelude.Text,
    -- | The details of an error returned by a URL external to AWS.
    ActionExecution -> Maybe ErrorDetails
errorDetails :: Prelude.Maybe ErrorDetails,
    -- | The external ID of the run of the action.
    ActionExecution -> Maybe Text
externalExecutionId :: Prelude.Maybe Prelude.Text,
    -- | The URL of a resource external to AWS that is used when running the
    -- action (for example, an external repository URL).
    ActionExecution -> Maybe Text
externalExecutionUrl :: Prelude.Maybe Prelude.Text,
    -- | The last status change of the action.
    ActionExecution -> Maybe POSIX
lastStatusChange :: Prelude.Maybe Data.POSIX,
    -- | The ARN of the user who last changed the pipeline.
    ActionExecution -> Maybe Text
lastUpdatedBy :: Prelude.Maybe Prelude.Text,
    -- | A percentage of completeness of the action as it runs.
    ActionExecution -> Maybe Natural
percentComplete :: Prelude.Maybe Prelude.Natural,
    -- | The status of the action, or for a completed action, the last status of
    -- the action.
    ActionExecution -> Maybe ActionExecutionStatus
status :: Prelude.Maybe ActionExecutionStatus,
    -- | A summary of the run of the action.
    ActionExecution -> Maybe Text
summary :: Prelude.Maybe Prelude.Text,
    -- | The system-generated token used to identify a unique approval request.
    -- The token for each open approval request can be obtained using the
    -- @GetPipelineState@ command. It is used to validate that the approval
    -- request corresponding to this token is still valid.
    ActionExecution -> Maybe Text
token :: Prelude.Maybe Prelude.Text
  }
  deriving (ActionExecution -> ActionExecution -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: ActionExecution -> ActionExecution -> Bool
$c/= :: ActionExecution -> ActionExecution -> Bool
== :: ActionExecution -> ActionExecution -> Bool
$c== :: ActionExecution -> ActionExecution -> Bool
Prelude.Eq, ReadPrec [ActionExecution]
ReadPrec ActionExecution
Int -> ReadS ActionExecution
ReadS [ActionExecution]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [ActionExecution]
$creadListPrec :: ReadPrec [ActionExecution]
readPrec :: ReadPrec ActionExecution
$creadPrec :: ReadPrec ActionExecution
readList :: ReadS [ActionExecution]
$creadList :: ReadS [ActionExecution]
readsPrec :: Int -> ReadS ActionExecution
$creadsPrec :: Int -> ReadS ActionExecution
Prelude.Read, Int -> ActionExecution -> ShowS
[ActionExecution] -> ShowS
ActionExecution -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [ActionExecution] -> ShowS
$cshowList :: [ActionExecution] -> ShowS
show :: ActionExecution -> String
$cshow :: ActionExecution -> String
showsPrec :: Int -> ActionExecution -> ShowS
$cshowsPrec :: Int -> ActionExecution -> ShowS
Prelude.Show, forall x. Rep ActionExecution x -> ActionExecution
forall x. ActionExecution -> Rep ActionExecution x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep ActionExecution x -> ActionExecution
$cfrom :: forall x. ActionExecution -> Rep ActionExecution x
Prelude.Generic)

-- |
-- Create a value of 'ActionExecution' 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:
--
-- 'actionExecutionId', 'actionExecution_actionExecutionId' - ID of the workflow action execution in the current stage. Use the
-- GetPipelineState action to retrieve the current action execution details
-- of the current stage.
--
-- For older executions, this field might be empty. The action execution ID
-- is available for executions run on or after March 2020.
--
-- 'errorDetails', 'actionExecution_errorDetails' - The details of an error returned by a URL external to AWS.
--
-- 'externalExecutionId', 'actionExecution_externalExecutionId' - The external ID of the run of the action.
--
-- 'externalExecutionUrl', 'actionExecution_externalExecutionUrl' - The URL of a resource external to AWS that is used when running the
-- action (for example, an external repository URL).
--
-- 'lastStatusChange', 'actionExecution_lastStatusChange' - The last status change of the action.
--
-- 'lastUpdatedBy', 'actionExecution_lastUpdatedBy' - The ARN of the user who last changed the pipeline.
--
-- 'percentComplete', 'actionExecution_percentComplete' - A percentage of completeness of the action as it runs.
--
-- 'status', 'actionExecution_status' - The status of the action, or for a completed action, the last status of
-- the action.
--
-- 'summary', 'actionExecution_summary' - A summary of the run of the action.
--
-- 'token', 'actionExecution_token' - The system-generated token used to identify a unique approval request.
-- The token for each open approval request can be obtained using the
-- @GetPipelineState@ command. It is used to validate that the approval
-- request corresponding to this token is still valid.
newActionExecution ::
  ActionExecution
newActionExecution :: ActionExecution
newActionExecution =
  ActionExecution'
    { $sel:actionExecutionId:ActionExecution' :: Maybe Text
actionExecutionId =
        forall a. Maybe a
Prelude.Nothing,
      $sel:errorDetails:ActionExecution' :: Maybe ErrorDetails
errorDetails = forall a. Maybe a
Prelude.Nothing,
      $sel:externalExecutionId:ActionExecution' :: Maybe Text
externalExecutionId = forall a. Maybe a
Prelude.Nothing,
      $sel:externalExecutionUrl:ActionExecution' :: Maybe Text
externalExecutionUrl = forall a. Maybe a
Prelude.Nothing,
      $sel:lastStatusChange:ActionExecution' :: Maybe POSIX
lastStatusChange = forall a. Maybe a
Prelude.Nothing,
      $sel:lastUpdatedBy:ActionExecution' :: Maybe Text
lastUpdatedBy = forall a. Maybe a
Prelude.Nothing,
      $sel:percentComplete:ActionExecution' :: Maybe Natural
percentComplete = forall a. Maybe a
Prelude.Nothing,
      $sel:status:ActionExecution' :: Maybe ActionExecutionStatus
status = forall a. Maybe a
Prelude.Nothing,
      $sel:summary:ActionExecution' :: Maybe Text
summary = forall a. Maybe a
Prelude.Nothing,
      $sel:token:ActionExecution' :: Maybe Text
token = forall a. Maybe a
Prelude.Nothing
    }

-- | ID of the workflow action execution in the current stage. Use the
-- GetPipelineState action to retrieve the current action execution details
-- of the current stage.
--
-- For older executions, this field might be empty. The action execution ID
-- is available for executions run on or after March 2020.
actionExecution_actionExecutionId :: Lens.Lens' ActionExecution (Prelude.Maybe Prelude.Text)
actionExecution_actionExecutionId :: Lens' ActionExecution (Maybe Text)
actionExecution_actionExecutionId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ActionExecution' {Maybe Text
actionExecutionId :: Maybe Text
$sel:actionExecutionId:ActionExecution' :: ActionExecution -> Maybe Text
actionExecutionId} -> Maybe Text
actionExecutionId) (\s :: ActionExecution
s@ActionExecution' {} Maybe Text
a -> ActionExecution
s {$sel:actionExecutionId:ActionExecution' :: Maybe Text
actionExecutionId = Maybe Text
a} :: ActionExecution)

-- | The details of an error returned by a URL external to AWS.
actionExecution_errorDetails :: Lens.Lens' ActionExecution (Prelude.Maybe ErrorDetails)
actionExecution_errorDetails :: Lens' ActionExecution (Maybe ErrorDetails)
actionExecution_errorDetails = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ActionExecution' {Maybe ErrorDetails
errorDetails :: Maybe ErrorDetails
$sel:errorDetails:ActionExecution' :: ActionExecution -> Maybe ErrorDetails
errorDetails} -> Maybe ErrorDetails
errorDetails) (\s :: ActionExecution
s@ActionExecution' {} Maybe ErrorDetails
a -> ActionExecution
s {$sel:errorDetails:ActionExecution' :: Maybe ErrorDetails
errorDetails = Maybe ErrorDetails
a} :: ActionExecution)

-- | The external ID of the run of the action.
actionExecution_externalExecutionId :: Lens.Lens' ActionExecution (Prelude.Maybe Prelude.Text)
actionExecution_externalExecutionId :: Lens' ActionExecution (Maybe Text)
actionExecution_externalExecutionId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ActionExecution' {Maybe Text
externalExecutionId :: Maybe Text
$sel:externalExecutionId:ActionExecution' :: ActionExecution -> Maybe Text
externalExecutionId} -> Maybe Text
externalExecutionId) (\s :: ActionExecution
s@ActionExecution' {} Maybe Text
a -> ActionExecution
s {$sel:externalExecutionId:ActionExecution' :: Maybe Text
externalExecutionId = Maybe Text
a} :: ActionExecution)

-- | The URL of a resource external to AWS that is used when running the
-- action (for example, an external repository URL).
actionExecution_externalExecutionUrl :: Lens.Lens' ActionExecution (Prelude.Maybe Prelude.Text)
actionExecution_externalExecutionUrl :: Lens' ActionExecution (Maybe Text)
actionExecution_externalExecutionUrl = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ActionExecution' {Maybe Text
externalExecutionUrl :: Maybe Text
$sel:externalExecutionUrl:ActionExecution' :: ActionExecution -> Maybe Text
externalExecutionUrl} -> Maybe Text
externalExecutionUrl) (\s :: ActionExecution
s@ActionExecution' {} Maybe Text
a -> ActionExecution
s {$sel:externalExecutionUrl:ActionExecution' :: Maybe Text
externalExecutionUrl = Maybe Text
a} :: ActionExecution)

-- | The last status change of the action.
actionExecution_lastStatusChange :: Lens.Lens' ActionExecution (Prelude.Maybe Prelude.UTCTime)
actionExecution_lastStatusChange :: Lens' ActionExecution (Maybe UTCTime)
actionExecution_lastStatusChange = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ActionExecution' {Maybe POSIX
lastStatusChange :: Maybe POSIX
$sel:lastStatusChange:ActionExecution' :: ActionExecution -> Maybe POSIX
lastStatusChange} -> Maybe POSIX
lastStatusChange) (\s :: ActionExecution
s@ActionExecution' {} Maybe POSIX
a -> ActionExecution
s {$sel:lastStatusChange:ActionExecution' :: Maybe POSIX
lastStatusChange = Maybe POSIX
a} :: ActionExecution) 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

-- | The ARN of the user who last changed the pipeline.
actionExecution_lastUpdatedBy :: Lens.Lens' ActionExecution (Prelude.Maybe Prelude.Text)
actionExecution_lastUpdatedBy :: Lens' ActionExecution (Maybe Text)
actionExecution_lastUpdatedBy = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ActionExecution' {Maybe Text
lastUpdatedBy :: Maybe Text
$sel:lastUpdatedBy:ActionExecution' :: ActionExecution -> Maybe Text
lastUpdatedBy} -> Maybe Text
lastUpdatedBy) (\s :: ActionExecution
s@ActionExecution' {} Maybe Text
a -> ActionExecution
s {$sel:lastUpdatedBy:ActionExecution' :: Maybe Text
lastUpdatedBy = Maybe Text
a} :: ActionExecution)

-- | A percentage of completeness of the action as it runs.
actionExecution_percentComplete :: Lens.Lens' ActionExecution (Prelude.Maybe Prelude.Natural)
actionExecution_percentComplete :: Lens' ActionExecution (Maybe Natural)
actionExecution_percentComplete = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ActionExecution' {Maybe Natural
percentComplete :: Maybe Natural
$sel:percentComplete:ActionExecution' :: ActionExecution -> Maybe Natural
percentComplete} -> Maybe Natural
percentComplete) (\s :: ActionExecution
s@ActionExecution' {} Maybe Natural
a -> ActionExecution
s {$sel:percentComplete:ActionExecution' :: Maybe Natural
percentComplete = Maybe Natural
a} :: ActionExecution)

-- | The status of the action, or for a completed action, the last status of
-- the action.
actionExecution_status :: Lens.Lens' ActionExecution (Prelude.Maybe ActionExecutionStatus)
actionExecution_status :: Lens' ActionExecution (Maybe ActionExecutionStatus)
actionExecution_status = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ActionExecution' {Maybe ActionExecutionStatus
status :: Maybe ActionExecutionStatus
$sel:status:ActionExecution' :: ActionExecution -> Maybe ActionExecutionStatus
status} -> Maybe ActionExecutionStatus
status) (\s :: ActionExecution
s@ActionExecution' {} Maybe ActionExecutionStatus
a -> ActionExecution
s {$sel:status:ActionExecution' :: Maybe ActionExecutionStatus
status = Maybe ActionExecutionStatus
a} :: ActionExecution)

-- | A summary of the run of the action.
actionExecution_summary :: Lens.Lens' ActionExecution (Prelude.Maybe Prelude.Text)
actionExecution_summary :: Lens' ActionExecution (Maybe Text)
actionExecution_summary = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ActionExecution' {Maybe Text
summary :: Maybe Text
$sel:summary:ActionExecution' :: ActionExecution -> Maybe Text
summary} -> Maybe Text
summary) (\s :: ActionExecution
s@ActionExecution' {} Maybe Text
a -> ActionExecution
s {$sel:summary:ActionExecution' :: Maybe Text
summary = Maybe Text
a} :: ActionExecution)

-- | The system-generated token used to identify a unique approval request.
-- The token for each open approval request can be obtained using the
-- @GetPipelineState@ command. It is used to validate that the approval
-- request corresponding to this token is still valid.
actionExecution_token :: Lens.Lens' ActionExecution (Prelude.Maybe Prelude.Text)
actionExecution_token :: Lens' ActionExecution (Maybe Text)
actionExecution_token = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ActionExecution' {Maybe Text
token :: Maybe Text
$sel:token:ActionExecution' :: ActionExecution -> Maybe Text
token} -> Maybe Text
token) (\s :: ActionExecution
s@ActionExecution' {} Maybe Text
a -> ActionExecution
s {$sel:token:ActionExecution' :: Maybe Text
token = Maybe Text
a} :: ActionExecution)

instance Data.FromJSON ActionExecution where
  parseJSON :: Value -> Parser ActionExecution
parseJSON =
    forall a. String -> (Object -> Parser a) -> Value -> Parser a
Data.withObject
      String
"ActionExecution"
      ( \Object
x ->
          Maybe Text
-> Maybe ErrorDetails
-> Maybe Text
-> Maybe Text
-> Maybe POSIX
-> Maybe Text
-> Maybe Natural
-> Maybe ActionExecutionStatus
-> Maybe Text
-> Maybe Text
-> ActionExecution
ActionExecution'
            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
"actionExecutionId")
            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
"errorDetails")
            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
"externalExecutionId")
            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
"externalExecutionUrl")
            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
"lastStatusChange")
            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
"lastUpdatedBy")
            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
"percentComplete")
            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
"summary")
            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
"token")
      )

instance Prelude.Hashable ActionExecution where
  hashWithSalt :: Int -> ActionExecution -> Int
hashWithSalt Int
_salt ActionExecution' {Maybe Natural
Maybe Text
Maybe POSIX
Maybe ActionExecutionStatus
Maybe ErrorDetails
token :: Maybe Text
summary :: Maybe Text
status :: Maybe ActionExecutionStatus
percentComplete :: Maybe Natural
lastUpdatedBy :: Maybe Text
lastStatusChange :: Maybe POSIX
externalExecutionUrl :: Maybe Text
externalExecutionId :: Maybe Text
errorDetails :: Maybe ErrorDetails
actionExecutionId :: Maybe Text
$sel:token:ActionExecution' :: ActionExecution -> Maybe Text
$sel:summary:ActionExecution' :: ActionExecution -> Maybe Text
$sel:status:ActionExecution' :: ActionExecution -> Maybe ActionExecutionStatus
$sel:percentComplete:ActionExecution' :: ActionExecution -> Maybe Natural
$sel:lastUpdatedBy:ActionExecution' :: ActionExecution -> Maybe Text
$sel:lastStatusChange:ActionExecution' :: ActionExecution -> Maybe POSIX
$sel:externalExecutionUrl:ActionExecution' :: ActionExecution -> Maybe Text
$sel:externalExecutionId:ActionExecution' :: ActionExecution -> Maybe Text
$sel:errorDetails:ActionExecution' :: ActionExecution -> Maybe ErrorDetails
$sel:actionExecutionId:ActionExecution' :: ActionExecution -> Maybe Text
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
actionExecutionId
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe ErrorDetails
errorDetails
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
externalExecutionId
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
externalExecutionUrl
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe POSIX
lastStatusChange
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
lastUpdatedBy
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Natural
percentComplete
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe ActionExecutionStatus
status
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
summary
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
token

instance Prelude.NFData ActionExecution where
  rnf :: ActionExecution -> ()
rnf ActionExecution' {Maybe Natural
Maybe Text
Maybe POSIX
Maybe ActionExecutionStatus
Maybe ErrorDetails
token :: Maybe Text
summary :: Maybe Text
status :: Maybe ActionExecutionStatus
percentComplete :: Maybe Natural
lastUpdatedBy :: Maybe Text
lastStatusChange :: Maybe POSIX
externalExecutionUrl :: Maybe Text
externalExecutionId :: Maybe Text
errorDetails :: Maybe ErrorDetails
actionExecutionId :: Maybe Text
$sel:token:ActionExecution' :: ActionExecution -> Maybe Text
$sel:summary:ActionExecution' :: ActionExecution -> Maybe Text
$sel:status:ActionExecution' :: ActionExecution -> Maybe ActionExecutionStatus
$sel:percentComplete:ActionExecution' :: ActionExecution -> Maybe Natural
$sel:lastUpdatedBy:ActionExecution' :: ActionExecution -> Maybe Text
$sel:lastStatusChange:ActionExecution' :: ActionExecution -> Maybe POSIX
$sel:externalExecutionUrl:ActionExecution' :: ActionExecution -> Maybe Text
$sel:externalExecutionId:ActionExecution' :: ActionExecution -> Maybe Text
$sel:errorDetails:ActionExecution' :: ActionExecution -> Maybe ErrorDetails
$sel:actionExecutionId:ActionExecution' :: ActionExecution -> Maybe Text
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
actionExecutionId
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe ErrorDetails
errorDetails
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
externalExecutionId
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
externalExecutionUrl
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe POSIX
lastStatusChange
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
lastUpdatedBy
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Natural
percentComplete
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe ActionExecutionStatus
status
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
summary
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
token