{-# 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.SageMakerGeoSpatial.Types.EarthObservationJobErrorType
-- 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.SageMakerGeoSpatial.Types.EarthObservationJobErrorType
  ( EarthObservationJobErrorType
      ( ..,
        EarthObservationJobErrorType_CLIENT_ERROR,
        EarthObservationJobErrorType_SERVER_ERROR
      ),
  )
where

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

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

pattern EarthObservationJobErrorType_CLIENT_ERROR :: EarthObservationJobErrorType
pattern $bEarthObservationJobErrorType_CLIENT_ERROR :: EarthObservationJobErrorType
$mEarthObservationJobErrorType_CLIENT_ERROR :: forall {r}.
EarthObservationJobErrorType -> ((# #) -> r) -> ((# #) -> r) -> r
EarthObservationJobErrorType_CLIENT_ERROR = EarthObservationJobErrorType' "CLIENT_ERROR"

pattern EarthObservationJobErrorType_SERVER_ERROR :: EarthObservationJobErrorType
pattern $bEarthObservationJobErrorType_SERVER_ERROR :: EarthObservationJobErrorType
$mEarthObservationJobErrorType_SERVER_ERROR :: forall {r}.
EarthObservationJobErrorType -> ((# #) -> r) -> ((# #) -> r) -> r
EarthObservationJobErrorType_SERVER_ERROR = EarthObservationJobErrorType' "SERVER_ERROR"

{-# COMPLETE
  EarthObservationJobErrorType_CLIENT_ERROR,
  EarthObservationJobErrorType_SERVER_ERROR,
  EarthObservationJobErrorType'
  #-}