{-# 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.SageMaker.Types.InferenceExperimentStatus
-- 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.SageMaker.Types.InferenceExperimentStatus
  ( InferenceExperimentStatus
      ( ..,
        InferenceExperimentStatus_Cancelled,
        InferenceExperimentStatus_Completed,
        InferenceExperimentStatus_Created,
        InferenceExperimentStatus_Creating,
        InferenceExperimentStatus_Running,
        InferenceExperimentStatus_Starting,
        InferenceExperimentStatus_Stopping,
        InferenceExperimentStatus_Updating
      ),
  )
where

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

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

pattern InferenceExperimentStatus_Cancelled :: InferenceExperimentStatus
pattern $bInferenceExperimentStatus_Cancelled :: InferenceExperimentStatus
$mInferenceExperimentStatus_Cancelled :: forall {r}.
InferenceExperimentStatus -> ((# #) -> r) -> ((# #) -> r) -> r
InferenceExperimentStatus_Cancelled = InferenceExperimentStatus' "Cancelled"

pattern InferenceExperimentStatus_Completed :: InferenceExperimentStatus
pattern $bInferenceExperimentStatus_Completed :: InferenceExperimentStatus
$mInferenceExperimentStatus_Completed :: forall {r}.
InferenceExperimentStatus -> ((# #) -> r) -> ((# #) -> r) -> r
InferenceExperimentStatus_Completed = InferenceExperimentStatus' "Completed"

pattern InferenceExperimentStatus_Created :: InferenceExperimentStatus
pattern $bInferenceExperimentStatus_Created :: InferenceExperimentStatus
$mInferenceExperimentStatus_Created :: forall {r}.
InferenceExperimentStatus -> ((# #) -> r) -> ((# #) -> r) -> r
InferenceExperimentStatus_Created = InferenceExperimentStatus' "Created"

pattern InferenceExperimentStatus_Creating :: InferenceExperimentStatus
pattern $bInferenceExperimentStatus_Creating :: InferenceExperimentStatus
$mInferenceExperimentStatus_Creating :: forall {r}.
InferenceExperimentStatus -> ((# #) -> r) -> ((# #) -> r) -> r
InferenceExperimentStatus_Creating = InferenceExperimentStatus' "Creating"

pattern InferenceExperimentStatus_Running :: InferenceExperimentStatus
pattern $bInferenceExperimentStatus_Running :: InferenceExperimentStatus
$mInferenceExperimentStatus_Running :: forall {r}.
InferenceExperimentStatus -> ((# #) -> r) -> ((# #) -> r) -> r
InferenceExperimentStatus_Running = InferenceExperimentStatus' "Running"

pattern InferenceExperimentStatus_Starting :: InferenceExperimentStatus
pattern $bInferenceExperimentStatus_Starting :: InferenceExperimentStatus
$mInferenceExperimentStatus_Starting :: forall {r}.
InferenceExperimentStatus -> ((# #) -> r) -> ((# #) -> r) -> r
InferenceExperimentStatus_Starting = InferenceExperimentStatus' "Starting"

pattern InferenceExperimentStatus_Stopping :: InferenceExperimentStatus
pattern $bInferenceExperimentStatus_Stopping :: InferenceExperimentStatus
$mInferenceExperimentStatus_Stopping :: forall {r}.
InferenceExperimentStatus -> ((# #) -> r) -> ((# #) -> r) -> r
InferenceExperimentStatus_Stopping = InferenceExperimentStatus' "Stopping"

pattern InferenceExperimentStatus_Updating :: InferenceExperimentStatus
pattern $bInferenceExperimentStatus_Updating :: InferenceExperimentStatus
$mInferenceExperimentStatus_Updating :: forall {r}.
InferenceExperimentStatus -> ((# #) -> r) -> ((# #) -> r) -> r
InferenceExperimentStatus_Updating = InferenceExperimentStatus' "Updating"

{-# COMPLETE
  InferenceExperimentStatus_Cancelled,
  InferenceExperimentStatus_Completed,
  InferenceExperimentStatus_Created,
  InferenceExperimentStatus_Creating,
  InferenceExperimentStatus_Running,
  InferenceExperimentStatus_Starting,
  InferenceExperimentStatus_Stopping,
  InferenceExperimentStatus_Updating,
  InferenceExperimentStatus'
  #-}