{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE DerivingStrategies #-}
{-# LANGUAGE GeneralizedNewtypeDeriving #-}
{-# LANGUAGE LambdaCase #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE PatternSynonyms #-}
{-# LANGUAGE StrictData #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
module Amazonka.ChimeSdkMediaPipelines.Types.ArtifactsState
  ( ArtifactsState
      ( ..,
        ArtifactsState_Disabled,
        ArtifactsState_Enabled
      ),
  )
where
import qualified Amazonka.Core as Core
import qualified Amazonka.Data as Data
import qualified Amazonka.Prelude as Prelude
newtype ArtifactsState = ArtifactsState'
  { ArtifactsState -> Text
fromArtifactsState ::
      Data.Text
  }
  deriving stock
    ( Int -> ArtifactsState -> ShowS
[ArtifactsState] -> ShowS
ArtifactsState -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [ArtifactsState] -> ShowS
$cshowList :: [ArtifactsState] -> ShowS
show :: ArtifactsState -> String
$cshow :: ArtifactsState -> String
showsPrec :: Int -> ArtifactsState -> ShowS
$cshowsPrec :: Int -> ArtifactsState -> ShowS
Prelude.Show,
      ReadPrec [ArtifactsState]
ReadPrec ArtifactsState
Int -> ReadS ArtifactsState
ReadS [ArtifactsState]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [ArtifactsState]
$creadListPrec :: ReadPrec [ArtifactsState]
readPrec :: ReadPrec ArtifactsState
$creadPrec :: ReadPrec ArtifactsState
readList :: ReadS [ArtifactsState]
$creadList :: ReadS [ArtifactsState]
readsPrec :: Int -> ReadS ArtifactsState
$creadsPrec :: Int -> ReadS ArtifactsState
Prelude.Read,
      ArtifactsState -> ArtifactsState -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: ArtifactsState -> ArtifactsState -> Bool
$c/= :: ArtifactsState -> ArtifactsState -> Bool
== :: ArtifactsState -> ArtifactsState -> Bool
$c== :: ArtifactsState -> ArtifactsState -> Bool
Prelude.Eq,
      Eq ArtifactsState
ArtifactsState -> ArtifactsState -> Bool
ArtifactsState -> ArtifactsState -> Ordering
ArtifactsState -> ArtifactsState -> ArtifactsState
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 :: ArtifactsState -> ArtifactsState -> ArtifactsState
$cmin :: ArtifactsState -> ArtifactsState -> ArtifactsState
max :: ArtifactsState -> ArtifactsState -> ArtifactsState
$cmax :: ArtifactsState -> ArtifactsState -> ArtifactsState
>= :: ArtifactsState -> ArtifactsState -> Bool
$c>= :: ArtifactsState -> ArtifactsState -> Bool
> :: ArtifactsState -> ArtifactsState -> Bool
$c> :: ArtifactsState -> ArtifactsState -> Bool
<= :: ArtifactsState -> ArtifactsState -> Bool
$c<= :: ArtifactsState -> ArtifactsState -> Bool
< :: ArtifactsState -> ArtifactsState -> Bool
$c< :: ArtifactsState -> ArtifactsState -> Bool
compare :: ArtifactsState -> ArtifactsState -> Ordering
$ccompare :: ArtifactsState -> ArtifactsState -> Ordering
Prelude.Ord,
      forall x. Rep ArtifactsState x -> ArtifactsState
forall x. ArtifactsState -> Rep ArtifactsState x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep ArtifactsState x -> ArtifactsState
$cfrom :: forall x. ArtifactsState -> Rep ArtifactsState x
Prelude.Generic
    )
  deriving newtype
    ( Eq ArtifactsState
Int -> ArtifactsState -> Int
ArtifactsState -> Int
forall a. Eq a -> (Int -> a -> Int) -> (a -> Int) -> Hashable a
hash :: ArtifactsState -> Int
$chash :: ArtifactsState -> Int
hashWithSalt :: Int -> ArtifactsState -> Int
$chashWithSalt :: Int -> ArtifactsState -> Int
Prelude.Hashable,
      ArtifactsState -> ()
forall a. (a -> ()) -> NFData a
rnf :: ArtifactsState -> ()
$crnf :: ArtifactsState -> ()
Prelude.NFData,
      Text -> Either String ArtifactsState
forall a. (Text -> Either String a) -> FromText a
fromText :: Text -> Either String ArtifactsState
$cfromText :: Text -> Either String ArtifactsState
Data.FromText,
      ArtifactsState -> Text
forall a. (a -> Text) -> ToText a
toText :: ArtifactsState -> Text
$ctoText :: ArtifactsState -> Text
Data.ToText,
      ArtifactsState -> ByteString
forall a. (a -> ByteString) -> ToByteString a
toBS :: ArtifactsState -> ByteString
$ctoBS :: ArtifactsState -> ByteString
Data.ToByteString,
      ArtifactsState -> ByteStringBuilder
forall a. (a -> ByteStringBuilder) -> ToLog a
build :: ArtifactsState -> ByteStringBuilder
$cbuild :: ArtifactsState -> ByteStringBuilder
Data.ToLog,
      HeaderName -> ArtifactsState -> [Header]
forall a. (HeaderName -> a -> [Header]) -> ToHeader a
toHeader :: HeaderName -> ArtifactsState -> [Header]
$ctoHeader :: HeaderName -> ArtifactsState -> [Header]
Data.ToHeader,
      ArtifactsState -> QueryString
forall a. (a -> QueryString) -> ToQuery a
toQuery :: ArtifactsState -> QueryString
$ctoQuery :: ArtifactsState -> QueryString
Data.ToQuery,
      Value -> Parser [ArtifactsState]
Value -> Parser ArtifactsState
forall a.
(Value -> Parser a) -> (Value -> Parser [a]) -> FromJSON a
parseJSONList :: Value -> Parser [ArtifactsState]
$cparseJSONList :: Value -> Parser [ArtifactsState]
parseJSON :: Value -> Parser ArtifactsState
$cparseJSON :: Value -> Parser ArtifactsState
Data.FromJSON,
      FromJSONKeyFunction [ArtifactsState]
FromJSONKeyFunction ArtifactsState
forall a.
FromJSONKeyFunction a -> FromJSONKeyFunction [a] -> FromJSONKey a
fromJSONKeyList :: FromJSONKeyFunction [ArtifactsState]
$cfromJSONKeyList :: FromJSONKeyFunction [ArtifactsState]
fromJSONKey :: FromJSONKeyFunction ArtifactsState
$cfromJSONKey :: FromJSONKeyFunction ArtifactsState
Data.FromJSONKey,
      [ArtifactsState] -> Encoding
[ArtifactsState] -> Value
ArtifactsState -> Encoding
ArtifactsState -> Value
forall a.
(a -> Value)
-> (a -> Encoding)
-> ([a] -> Value)
-> ([a] -> Encoding)
-> ToJSON a
toEncodingList :: [ArtifactsState] -> Encoding
$ctoEncodingList :: [ArtifactsState] -> Encoding
toJSONList :: [ArtifactsState] -> Value
$ctoJSONList :: [ArtifactsState] -> Value
toEncoding :: ArtifactsState -> Encoding
$ctoEncoding :: ArtifactsState -> Encoding
toJSON :: ArtifactsState -> Value
$ctoJSON :: ArtifactsState -> Value
Data.ToJSON,
      ToJSONKeyFunction [ArtifactsState]
ToJSONKeyFunction ArtifactsState
forall a.
ToJSONKeyFunction a -> ToJSONKeyFunction [a] -> ToJSONKey a
toJSONKeyList :: ToJSONKeyFunction [ArtifactsState]
$ctoJSONKeyList :: ToJSONKeyFunction [ArtifactsState]
toJSONKey :: ToJSONKeyFunction ArtifactsState
$ctoJSONKey :: ToJSONKeyFunction ArtifactsState
Data.ToJSONKey,
      [Node] -> Either String ArtifactsState
forall a. ([Node] -> Either String a) -> FromXML a
parseXML :: [Node] -> Either String ArtifactsState
$cparseXML :: [Node] -> Either String ArtifactsState
Data.FromXML,
      ArtifactsState -> XML
forall a. (a -> XML) -> ToXML a
toXML :: ArtifactsState -> XML
$ctoXML :: ArtifactsState -> XML
Data.ToXML
    )
pattern ArtifactsState_Disabled :: ArtifactsState
pattern $bArtifactsState_Disabled :: ArtifactsState
$mArtifactsState_Disabled :: forall {r}. ArtifactsState -> ((# #) -> r) -> ((# #) -> r) -> r
ArtifactsState_Disabled = ArtifactsState' "Disabled"
pattern ArtifactsState_Enabled :: ArtifactsState
pattern $bArtifactsState_Enabled :: ArtifactsState
$mArtifactsState_Enabled :: forall {r}. ArtifactsState -> ((# #) -> r) -> ((# #) -> r) -> r
ArtifactsState_Enabled = ArtifactsState' "Enabled"
{-# COMPLETE
  ArtifactsState_Disabled,
  ArtifactsState_Enabled,
  ArtifactsState'
  #-}