{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE DerivingStrategies #-}
{-# LANGUAGE GeneralizedNewtypeDeriving #-}
{-# LANGUAGE LambdaCase #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE PatternSynonyms #-}
{-# LANGUAGE StrictData #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}

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

-- |
-- Module      : Amazonka.SWF.Types.ContinueAsNewWorkflowExecutionFailedCause
-- 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.SWF.Types.ContinueAsNewWorkflowExecutionFailedCause
  ( ContinueAsNewWorkflowExecutionFailedCause
      ( ..,
        ContinueAsNewWorkflowExecutionFailedCause_CONTINUE_AS_NEW_WORKFLOW_EXECUTION_RATE_EXCEEDED,
        ContinueAsNewWorkflowExecutionFailedCause_DEFAULT_CHILD_POLICY_UNDEFINED,
        ContinueAsNewWorkflowExecutionFailedCause_DEFAULT_EXECUTION_START_TO_CLOSE_TIMEOUT_UNDEFINED,
        ContinueAsNewWorkflowExecutionFailedCause_DEFAULT_TASK_LIST_UNDEFINED,
        ContinueAsNewWorkflowExecutionFailedCause_DEFAULT_TASK_START_TO_CLOSE_TIMEOUT_UNDEFINED,
        ContinueAsNewWorkflowExecutionFailedCause_OPERATION_NOT_PERMITTED,
        ContinueAsNewWorkflowExecutionFailedCause_UNHANDLED_DECISION,
        ContinueAsNewWorkflowExecutionFailedCause_WORKFLOW_TYPE_DEPRECATED,
        ContinueAsNewWorkflowExecutionFailedCause_WORKFLOW_TYPE_DOES_NOT_EXIST
      ),
  )
where

import qualified Amazonka.Core as Core
import qualified Amazonka.Data as Data
import qualified Amazonka.Prelude as Prelude

newtype ContinueAsNewWorkflowExecutionFailedCause = ContinueAsNewWorkflowExecutionFailedCause'
  { ContinueAsNewWorkflowExecutionFailedCause -> Text
fromContinueAsNewWorkflowExecutionFailedCause ::
      Data.Text
  }
  deriving stock
    ( Int -> ContinueAsNewWorkflowExecutionFailedCause -> ShowS
[ContinueAsNewWorkflowExecutionFailedCause] -> ShowS
ContinueAsNewWorkflowExecutionFailedCause -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [ContinueAsNewWorkflowExecutionFailedCause] -> ShowS
$cshowList :: [ContinueAsNewWorkflowExecutionFailedCause] -> ShowS
show :: ContinueAsNewWorkflowExecutionFailedCause -> String
$cshow :: ContinueAsNewWorkflowExecutionFailedCause -> String
showsPrec :: Int -> ContinueAsNewWorkflowExecutionFailedCause -> ShowS
$cshowsPrec :: Int -> ContinueAsNewWorkflowExecutionFailedCause -> ShowS
Prelude.Show,
      ReadPrec [ContinueAsNewWorkflowExecutionFailedCause]
ReadPrec ContinueAsNewWorkflowExecutionFailedCause
Int -> ReadS ContinueAsNewWorkflowExecutionFailedCause
ReadS [ContinueAsNewWorkflowExecutionFailedCause]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [ContinueAsNewWorkflowExecutionFailedCause]
$creadListPrec :: ReadPrec [ContinueAsNewWorkflowExecutionFailedCause]
readPrec :: ReadPrec ContinueAsNewWorkflowExecutionFailedCause
$creadPrec :: ReadPrec ContinueAsNewWorkflowExecutionFailedCause
readList :: ReadS [ContinueAsNewWorkflowExecutionFailedCause]
$creadList :: ReadS [ContinueAsNewWorkflowExecutionFailedCause]
readsPrec :: Int -> ReadS ContinueAsNewWorkflowExecutionFailedCause
$creadsPrec :: Int -> ReadS ContinueAsNewWorkflowExecutionFailedCause
Prelude.Read,
      ContinueAsNewWorkflowExecutionFailedCause
-> ContinueAsNewWorkflowExecutionFailedCause -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: ContinueAsNewWorkflowExecutionFailedCause
-> ContinueAsNewWorkflowExecutionFailedCause -> Bool
$c/= :: ContinueAsNewWorkflowExecutionFailedCause
-> ContinueAsNewWorkflowExecutionFailedCause -> Bool
== :: ContinueAsNewWorkflowExecutionFailedCause
-> ContinueAsNewWorkflowExecutionFailedCause -> Bool
$c== :: ContinueAsNewWorkflowExecutionFailedCause
-> ContinueAsNewWorkflowExecutionFailedCause -> Bool
Prelude.Eq,
      Eq ContinueAsNewWorkflowExecutionFailedCause
ContinueAsNewWorkflowExecutionFailedCause
-> ContinueAsNewWorkflowExecutionFailedCause -> Bool
ContinueAsNewWorkflowExecutionFailedCause
-> ContinueAsNewWorkflowExecutionFailedCause -> Ordering
ContinueAsNewWorkflowExecutionFailedCause
-> ContinueAsNewWorkflowExecutionFailedCause
-> ContinueAsNewWorkflowExecutionFailedCause
forall a.
Eq a
-> (a -> a -> Ordering)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> a)
-> (a -> a -> a)
-> Ord a
min :: ContinueAsNewWorkflowExecutionFailedCause
-> ContinueAsNewWorkflowExecutionFailedCause
-> ContinueAsNewWorkflowExecutionFailedCause
$cmin :: ContinueAsNewWorkflowExecutionFailedCause
-> ContinueAsNewWorkflowExecutionFailedCause
-> ContinueAsNewWorkflowExecutionFailedCause
max :: ContinueAsNewWorkflowExecutionFailedCause
-> ContinueAsNewWorkflowExecutionFailedCause
-> ContinueAsNewWorkflowExecutionFailedCause
$cmax :: ContinueAsNewWorkflowExecutionFailedCause
-> ContinueAsNewWorkflowExecutionFailedCause
-> ContinueAsNewWorkflowExecutionFailedCause
>= :: ContinueAsNewWorkflowExecutionFailedCause
-> ContinueAsNewWorkflowExecutionFailedCause -> Bool
$c>= :: ContinueAsNewWorkflowExecutionFailedCause
-> ContinueAsNewWorkflowExecutionFailedCause -> Bool
> :: ContinueAsNewWorkflowExecutionFailedCause
-> ContinueAsNewWorkflowExecutionFailedCause -> Bool
$c> :: ContinueAsNewWorkflowExecutionFailedCause
-> ContinueAsNewWorkflowExecutionFailedCause -> Bool
<= :: ContinueAsNewWorkflowExecutionFailedCause
-> ContinueAsNewWorkflowExecutionFailedCause -> Bool
$c<= :: ContinueAsNewWorkflowExecutionFailedCause
-> ContinueAsNewWorkflowExecutionFailedCause -> Bool
< :: ContinueAsNewWorkflowExecutionFailedCause
-> ContinueAsNewWorkflowExecutionFailedCause -> Bool
$c< :: ContinueAsNewWorkflowExecutionFailedCause
-> ContinueAsNewWorkflowExecutionFailedCause -> Bool
compare :: ContinueAsNewWorkflowExecutionFailedCause
-> ContinueAsNewWorkflowExecutionFailedCause -> Ordering
$ccompare :: ContinueAsNewWorkflowExecutionFailedCause
-> ContinueAsNewWorkflowExecutionFailedCause -> Ordering
Prelude.Ord,
      forall x.
Rep ContinueAsNewWorkflowExecutionFailedCause x
-> ContinueAsNewWorkflowExecutionFailedCause
forall x.
ContinueAsNewWorkflowExecutionFailedCause
-> Rep ContinueAsNewWorkflowExecutionFailedCause x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep ContinueAsNewWorkflowExecutionFailedCause x
-> ContinueAsNewWorkflowExecutionFailedCause
$cfrom :: forall x.
ContinueAsNewWorkflowExecutionFailedCause
-> Rep ContinueAsNewWorkflowExecutionFailedCause x
Prelude.Generic
    )
  deriving newtype
    ( Eq ContinueAsNewWorkflowExecutionFailedCause
Int -> ContinueAsNewWorkflowExecutionFailedCause -> Int
ContinueAsNewWorkflowExecutionFailedCause -> Int
forall a. Eq a -> (Int -> a -> Int) -> (a -> Int) -> Hashable a
hash :: ContinueAsNewWorkflowExecutionFailedCause -> Int
$chash :: ContinueAsNewWorkflowExecutionFailedCause -> Int
hashWithSalt :: Int -> ContinueAsNewWorkflowExecutionFailedCause -> Int
$chashWithSalt :: Int -> ContinueAsNewWorkflowExecutionFailedCause -> Int
Prelude.Hashable,
      ContinueAsNewWorkflowExecutionFailedCause -> ()
forall a. (a -> ()) -> NFData a
rnf :: ContinueAsNewWorkflowExecutionFailedCause -> ()
$crnf :: ContinueAsNewWorkflowExecutionFailedCause -> ()
Prelude.NFData,
      Text -> Either String ContinueAsNewWorkflowExecutionFailedCause
forall a. (Text -> Either String a) -> FromText a
fromText :: Text -> Either String ContinueAsNewWorkflowExecutionFailedCause
$cfromText :: Text -> Either String ContinueAsNewWorkflowExecutionFailedCause
Data.FromText,
      ContinueAsNewWorkflowExecutionFailedCause -> Text
forall a. (a -> Text) -> ToText a
toText :: ContinueAsNewWorkflowExecutionFailedCause -> Text
$ctoText :: ContinueAsNewWorkflowExecutionFailedCause -> Text
Data.ToText,
      ContinueAsNewWorkflowExecutionFailedCause -> ByteString
forall a. (a -> ByteString) -> ToByteString a
toBS :: ContinueAsNewWorkflowExecutionFailedCause -> ByteString
$ctoBS :: ContinueAsNewWorkflowExecutionFailedCause -> ByteString
Data.ToByteString,
      ContinueAsNewWorkflowExecutionFailedCause -> ByteStringBuilder
forall a. (a -> ByteStringBuilder) -> ToLog a
build :: ContinueAsNewWorkflowExecutionFailedCause -> ByteStringBuilder
$cbuild :: ContinueAsNewWorkflowExecutionFailedCause -> ByteStringBuilder
Data.ToLog,
      HeaderName -> ContinueAsNewWorkflowExecutionFailedCause -> [Header]
forall a. (HeaderName -> a -> [Header]) -> ToHeader a
toHeader :: HeaderName -> ContinueAsNewWorkflowExecutionFailedCause -> [Header]
$ctoHeader :: HeaderName -> ContinueAsNewWorkflowExecutionFailedCause -> [Header]
Data.ToHeader,
      ContinueAsNewWorkflowExecutionFailedCause -> QueryString
forall a. (a -> QueryString) -> ToQuery a
toQuery :: ContinueAsNewWorkflowExecutionFailedCause -> QueryString
$ctoQuery :: ContinueAsNewWorkflowExecutionFailedCause -> QueryString
Data.ToQuery,
      Value -> Parser [ContinueAsNewWorkflowExecutionFailedCause]
Value -> Parser ContinueAsNewWorkflowExecutionFailedCause
forall a.
(Value -> Parser a) -> (Value -> Parser [a]) -> FromJSON a
parseJSONList :: Value -> Parser [ContinueAsNewWorkflowExecutionFailedCause]
$cparseJSONList :: Value -> Parser [ContinueAsNewWorkflowExecutionFailedCause]
parseJSON :: Value -> Parser ContinueAsNewWorkflowExecutionFailedCause
$cparseJSON :: Value -> Parser ContinueAsNewWorkflowExecutionFailedCause
Data.FromJSON,
      FromJSONKeyFunction [ContinueAsNewWorkflowExecutionFailedCause]
FromJSONKeyFunction ContinueAsNewWorkflowExecutionFailedCause
forall a.
FromJSONKeyFunction a -> FromJSONKeyFunction [a] -> FromJSONKey a
fromJSONKeyList :: FromJSONKeyFunction [ContinueAsNewWorkflowExecutionFailedCause]
$cfromJSONKeyList :: FromJSONKeyFunction [ContinueAsNewWorkflowExecutionFailedCause]
fromJSONKey :: FromJSONKeyFunction ContinueAsNewWorkflowExecutionFailedCause
$cfromJSONKey :: FromJSONKeyFunction ContinueAsNewWorkflowExecutionFailedCause
Data.FromJSONKey,
      [ContinueAsNewWorkflowExecutionFailedCause] -> Encoding
[ContinueAsNewWorkflowExecutionFailedCause] -> Value
ContinueAsNewWorkflowExecutionFailedCause -> Encoding
ContinueAsNewWorkflowExecutionFailedCause -> Value
forall a.
(a -> Value)
-> (a -> Encoding)
-> ([a] -> Value)
-> ([a] -> Encoding)
-> ToJSON a
toEncodingList :: [ContinueAsNewWorkflowExecutionFailedCause] -> Encoding
$ctoEncodingList :: [ContinueAsNewWorkflowExecutionFailedCause] -> Encoding
toJSONList :: [ContinueAsNewWorkflowExecutionFailedCause] -> Value
$ctoJSONList :: [ContinueAsNewWorkflowExecutionFailedCause] -> Value
toEncoding :: ContinueAsNewWorkflowExecutionFailedCause -> Encoding
$ctoEncoding :: ContinueAsNewWorkflowExecutionFailedCause -> Encoding
toJSON :: ContinueAsNewWorkflowExecutionFailedCause -> Value
$ctoJSON :: ContinueAsNewWorkflowExecutionFailedCause -> Value
Data.ToJSON,
      ToJSONKeyFunction [ContinueAsNewWorkflowExecutionFailedCause]
ToJSONKeyFunction ContinueAsNewWorkflowExecutionFailedCause
forall a.
ToJSONKeyFunction a -> ToJSONKeyFunction [a] -> ToJSONKey a
toJSONKeyList :: ToJSONKeyFunction [ContinueAsNewWorkflowExecutionFailedCause]
$ctoJSONKeyList :: ToJSONKeyFunction [ContinueAsNewWorkflowExecutionFailedCause]
toJSONKey :: ToJSONKeyFunction ContinueAsNewWorkflowExecutionFailedCause
$ctoJSONKey :: ToJSONKeyFunction ContinueAsNewWorkflowExecutionFailedCause
Data.ToJSONKey,
      [Node] -> Either String ContinueAsNewWorkflowExecutionFailedCause
forall a. ([Node] -> Either String a) -> FromXML a
parseXML :: [Node] -> Either String ContinueAsNewWorkflowExecutionFailedCause
$cparseXML :: [Node] -> Either String ContinueAsNewWorkflowExecutionFailedCause
Data.FromXML,
      ContinueAsNewWorkflowExecutionFailedCause -> XML
forall a. (a -> XML) -> ToXML a
toXML :: ContinueAsNewWorkflowExecutionFailedCause -> XML
$ctoXML :: ContinueAsNewWorkflowExecutionFailedCause -> XML
Data.ToXML
    )

pattern ContinueAsNewWorkflowExecutionFailedCause_CONTINUE_AS_NEW_WORKFLOW_EXECUTION_RATE_EXCEEDED :: ContinueAsNewWorkflowExecutionFailedCause
pattern $bContinueAsNewWorkflowExecutionFailedCause_CONTINUE_AS_NEW_WORKFLOW_EXECUTION_RATE_EXCEEDED :: ContinueAsNewWorkflowExecutionFailedCause
$mContinueAsNewWorkflowExecutionFailedCause_CONTINUE_AS_NEW_WORKFLOW_EXECUTION_RATE_EXCEEDED :: forall {r}.
ContinueAsNewWorkflowExecutionFailedCause
-> ((# #) -> r) -> ((# #) -> r) -> r
ContinueAsNewWorkflowExecutionFailedCause_CONTINUE_AS_NEW_WORKFLOW_EXECUTION_RATE_EXCEEDED = ContinueAsNewWorkflowExecutionFailedCause' "CONTINUE_AS_NEW_WORKFLOW_EXECUTION_RATE_EXCEEDED"

pattern ContinueAsNewWorkflowExecutionFailedCause_DEFAULT_CHILD_POLICY_UNDEFINED :: ContinueAsNewWorkflowExecutionFailedCause
pattern $bContinueAsNewWorkflowExecutionFailedCause_DEFAULT_CHILD_POLICY_UNDEFINED :: ContinueAsNewWorkflowExecutionFailedCause
$mContinueAsNewWorkflowExecutionFailedCause_DEFAULT_CHILD_POLICY_UNDEFINED :: forall {r}.
ContinueAsNewWorkflowExecutionFailedCause
-> ((# #) -> r) -> ((# #) -> r) -> r
ContinueAsNewWorkflowExecutionFailedCause_DEFAULT_CHILD_POLICY_UNDEFINED = ContinueAsNewWorkflowExecutionFailedCause' "DEFAULT_CHILD_POLICY_UNDEFINED"

pattern ContinueAsNewWorkflowExecutionFailedCause_DEFAULT_EXECUTION_START_TO_CLOSE_TIMEOUT_UNDEFINED :: ContinueAsNewWorkflowExecutionFailedCause
pattern $bContinueAsNewWorkflowExecutionFailedCause_DEFAULT_EXECUTION_START_TO_CLOSE_TIMEOUT_UNDEFINED :: ContinueAsNewWorkflowExecutionFailedCause
$mContinueAsNewWorkflowExecutionFailedCause_DEFAULT_EXECUTION_START_TO_CLOSE_TIMEOUT_UNDEFINED :: forall {r}.
ContinueAsNewWorkflowExecutionFailedCause
-> ((# #) -> r) -> ((# #) -> r) -> r
ContinueAsNewWorkflowExecutionFailedCause_DEFAULT_EXECUTION_START_TO_CLOSE_TIMEOUT_UNDEFINED = ContinueAsNewWorkflowExecutionFailedCause' "DEFAULT_EXECUTION_START_TO_CLOSE_TIMEOUT_UNDEFINED"

pattern ContinueAsNewWorkflowExecutionFailedCause_DEFAULT_TASK_LIST_UNDEFINED :: ContinueAsNewWorkflowExecutionFailedCause
pattern $bContinueAsNewWorkflowExecutionFailedCause_DEFAULT_TASK_LIST_UNDEFINED :: ContinueAsNewWorkflowExecutionFailedCause
$mContinueAsNewWorkflowExecutionFailedCause_DEFAULT_TASK_LIST_UNDEFINED :: forall {r}.
ContinueAsNewWorkflowExecutionFailedCause
-> ((# #) -> r) -> ((# #) -> r) -> r
ContinueAsNewWorkflowExecutionFailedCause_DEFAULT_TASK_LIST_UNDEFINED = ContinueAsNewWorkflowExecutionFailedCause' "DEFAULT_TASK_LIST_UNDEFINED"

pattern ContinueAsNewWorkflowExecutionFailedCause_DEFAULT_TASK_START_TO_CLOSE_TIMEOUT_UNDEFINED :: ContinueAsNewWorkflowExecutionFailedCause
pattern $bContinueAsNewWorkflowExecutionFailedCause_DEFAULT_TASK_START_TO_CLOSE_TIMEOUT_UNDEFINED :: ContinueAsNewWorkflowExecutionFailedCause
$mContinueAsNewWorkflowExecutionFailedCause_DEFAULT_TASK_START_TO_CLOSE_TIMEOUT_UNDEFINED :: forall {r}.
ContinueAsNewWorkflowExecutionFailedCause
-> ((# #) -> r) -> ((# #) -> r) -> r
ContinueAsNewWorkflowExecutionFailedCause_DEFAULT_TASK_START_TO_CLOSE_TIMEOUT_UNDEFINED = ContinueAsNewWorkflowExecutionFailedCause' "DEFAULT_TASK_START_TO_CLOSE_TIMEOUT_UNDEFINED"

pattern ContinueAsNewWorkflowExecutionFailedCause_OPERATION_NOT_PERMITTED :: ContinueAsNewWorkflowExecutionFailedCause
pattern $bContinueAsNewWorkflowExecutionFailedCause_OPERATION_NOT_PERMITTED :: ContinueAsNewWorkflowExecutionFailedCause
$mContinueAsNewWorkflowExecutionFailedCause_OPERATION_NOT_PERMITTED :: forall {r}.
ContinueAsNewWorkflowExecutionFailedCause
-> ((# #) -> r) -> ((# #) -> r) -> r
ContinueAsNewWorkflowExecutionFailedCause_OPERATION_NOT_PERMITTED = ContinueAsNewWorkflowExecutionFailedCause' "OPERATION_NOT_PERMITTED"

pattern ContinueAsNewWorkflowExecutionFailedCause_UNHANDLED_DECISION :: ContinueAsNewWorkflowExecutionFailedCause
pattern $bContinueAsNewWorkflowExecutionFailedCause_UNHANDLED_DECISION :: ContinueAsNewWorkflowExecutionFailedCause
$mContinueAsNewWorkflowExecutionFailedCause_UNHANDLED_DECISION :: forall {r}.
ContinueAsNewWorkflowExecutionFailedCause
-> ((# #) -> r) -> ((# #) -> r) -> r
ContinueAsNewWorkflowExecutionFailedCause_UNHANDLED_DECISION = ContinueAsNewWorkflowExecutionFailedCause' "UNHANDLED_DECISION"

pattern ContinueAsNewWorkflowExecutionFailedCause_WORKFLOW_TYPE_DEPRECATED :: ContinueAsNewWorkflowExecutionFailedCause
pattern $bContinueAsNewWorkflowExecutionFailedCause_WORKFLOW_TYPE_DEPRECATED :: ContinueAsNewWorkflowExecutionFailedCause
$mContinueAsNewWorkflowExecutionFailedCause_WORKFLOW_TYPE_DEPRECATED :: forall {r}.
ContinueAsNewWorkflowExecutionFailedCause
-> ((# #) -> r) -> ((# #) -> r) -> r
ContinueAsNewWorkflowExecutionFailedCause_WORKFLOW_TYPE_DEPRECATED = ContinueAsNewWorkflowExecutionFailedCause' "WORKFLOW_TYPE_DEPRECATED"

pattern ContinueAsNewWorkflowExecutionFailedCause_WORKFLOW_TYPE_DOES_NOT_EXIST :: ContinueAsNewWorkflowExecutionFailedCause
pattern $bContinueAsNewWorkflowExecutionFailedCause_WORKFLOW_TYPE_DOES_NOT_EXIST :: ContinueAsNewWorkflowExecutionFailedCause
$mContinueAsNewWorkflowExecutionFailedCause_WORKFLOW_TYPE_DOES_NOT_EXIST :: forall {r}.
ContinueAsNewWorkflowExecutionFailedCause
-> ((# #) -> r) -> ((# #) -> r) -> r
ContinueAsNewWorkflowExecutionFailedCause_WORKFLOW_TYPE_DOES_NOT_EXIST = ContinueAsNewWorkflowExecutionFailedCause' "WORKFLOW_TYPE_DOES_NOT_EXIST"

{-# COMPLETE
  ContinueAsNewWorkflowExecutionFailedCause_CONTINUE_AS_NEW_WORKFLOW_EXECUTION_RATE_EXCEEDED,
  ContinueAsNewWorkflowExecutionFailedCause_DEFAULT_CHILD_POLICY_UNDEFINED,
  ContinueAsNewWorkflowExecutionFailedCause_DEFAULT_EXECUTION_START_TO_CLOSE_TIMEOUT_UNDEFINED,
  ContinueAsNewWorkflowExecutionFailedCause_DEFAULT_TASK_LIST_UNDEFINED,
  ContinueAsNewWorkflowExecutionFailedCause_DEFAULT_TASK_START_TO_CLOSE_TIMEOUT_UNDEFINED,
  ContinueAsNewWorkflowExecutionFailedCause_OPERATION_NOT_PERMITTED,
  ContinueAsNewWorkflowExecutionFailedCause_UNHANDLED_DECISION,
  ContinueAsNewWorkflowExecutionFailedCause_WORKFLOW_TYPE_DEPRECATED,
  ContinueAsNewWorkflowExecutionFailedCause_WORKFLOW_TYPE_DOES_NOT_EXIST,
  ContinueAsNewWorkflowExecutionFailedCause'
  #-}