{-# 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.MigrationHubOrchestrator.Types.StepStatus
-- 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.MigrationHubOrchestrator.Types.StepStatus
  ( StepStatus
      ( ..,
        StepStatus_AWAITING_DEPENDENCIES,
        StepStatus_COMPLETED,
        StepStatus_FAILED,
        StepStatus_IN_PROGRESS,
        StepStatus_PAUSED,
        StepStatus_READY,
        StepStatus_USER_ATTENTION_REQUIRED
      ),
  )
where

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

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

pattern StepStatus_AWAITING_DEPENDENCIES :: StepStatus
pattern $bStepStatus_AWAITING_DEPENDENCIES :: StepStatus
$mStepStatus_AWAITING_DEPENDENCIES :: forall {r}. StepStatus -> ((# #) -> r) -> ((# #) -> r) -> r
StepStatus_AWAITING_DEPENDENCIES = StepStatus' "AWAITING_DEPENDENCIES"

pattern StepStatus_COMPLETED :: StepStatus
pattern $bStepStatus_COMPLETED :: StepStatus
$mStepStatus_COMPLETED :: forall {r}. StepStatus -> ((# #) -> r) -> ((# #) -> r) -> r
StepStatus_COMPLETED = StepStatus' "COMPLETED"

pattern StepStatus_FAILED :: StepStatus
pattern $bStepStatus_FAILED :: StepStatus
$mStepStatus_FAILED :: forall {r}. StepStatus -> ((# #) -> r) -> ((# #) -> r) -> r
StepStatus_FAILED = StepStatus' "FAILED"

pattern StepStatus_IN_PROGRESS :: StepStatus
pattern $bStepStatus_IN_PROGRESS :: StepStatus
$mStepStatus_IN_PROGRESS :: forall {r}. StepStatus -> ((# #) -> r) -> ((# #) -> r) -> r
StepStatus_IN_PROGRESS = StepStatus' "IN_PROGRESS"

pattern StepStatus_PAUSED :: StepStatus
pattern $bStepStatus_PAUSED :: StepStatus
$mStepStatus_PAUSED :: forall {r}. StepStatus -> ((# #) -> r) -> ((# #) -> r) -> r
StepStatus_PAUSED = StepStatus' "PAUSED"

pattern StepStatus_READY :: StepStatus
pattern $bStepStatus_READY :: StepStatus
$mStepStatus_READY :: forall {r}. StepStatus -> ((# #) -> r) -> ((# #) -> r) -> r
StepStatus_READY = StepStatus' "READY"

pattern StepStatus_USER_ATTENTION_REQUIRED :: StepStatus
pattern $bStepStatus_USER_ATTENTION_REQUIRED :: StepStatus
$mStepStatus_USER_ATTENTION_REQUIRED :: forall {r}. StepStatus -> ((# #) -> r) -> ((# #) -> r) -> r
StepStatus_USER_ATTENTION_REQUIRED = StepStatus' "USER_ATTENTION_REQUIRED"

{-# COMPLETE
  StepStatus_AWAITING_DEPENDENCIES,
  StepStatus_COMPLETED,
  StepStatus_FAILED,
  StepStatus_IN_PROGRESS,
  StepStatus_PAUSED,
  StepStatus_READY,
  StepStatus_USER_ATTENTION_REQUIRED,
  StepStatus'
  #-}