{-# 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.Route53AutoNaming.Types.OperationType
-- 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.Route53AutoNaming.Types.OperationType
  ( OperationType
      ( ..,
        OperationType_CREATE_NAMESPACE,
        OperationType_DELETE_NAMESPACE,
        OperationType_DEREGISTER_INSTANCE,
        OperationType_REGISTER_INSTANCE,
        OperationType_UPDATE_NAMESPACE,
        OperationType_UPDATE_SERVICE
      ),
  )
where

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

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

pattern OperationType_CREATE_NAMESPACE :: OperationType
pattern $bOperationType_CREATE_NAMESPACE :: OperationType
$mOperationType_CREATE_NAMESPACE :: forall {r}. OperationType -> ((# #) -> r) -> ((# #) -> r) -> r
OperationType_CREATE_NAMESPACE = OperationType' "CREATE_NAMESPACE"

pattern OperationType_DELETE_NAMESPACE :: OperationType
pattern $bOperationType_DELETE_NAMESPACE :: OperationType
$mOperationType_DELETE_NAMESPACE :: forall {r}. OperationType -> ((# #) -> r) -> ((# #) -> r) -> r
OperationType_DELETE_NAMESPACE = OperationType' "DELETE_NAMESPACE"

pattern OperationType_DEREGISTER_INSTANCE :: OperationType
pattern $bOperationType_DEREGISTER_INSTANCE :: OperationType
$mOperationType_DEREGISTER_INSTANCE :: forall {r}. OperationType -> ((# #) -> r) -> ((# #) -> r) -> r
OperationType_DEREGISTER_INSTANCE = OperationType' "DEREGISTER_INSTANCE"

pattern OperationType_REGISTER_INSTANCE :: OperationType
pattern $bOperationType_REGISTER_INSTANCE :: OperationType
$mOperationType_REGISTER_INSTANCE :: forall {r}. OperationType -> ((# #) -> r) -> ((# #) -> r) -> r
OperationType_REGISTER_INSTANCE = OperationType' "REGISTER_INSTANCE"

pattern OperationType_UPDATE_NAMESPACE :: OperationType
pattern $bOperationType_UPDATE_NAMESPACE :: OperationType
$mOperationType_UPDATE_NAMESPACE :: forall {r}. OperationType -> ((# #) -> r) -> ((# #) -> r) -> r
OperationType_UPDATE_NAMESPACE = OperationType' "UPDATE_NAMESPACE"

pattern OperationType_UPDATE_SERVICE :: OperationType
pattern $bOperationType_UPDATE_SERVICE :: OperationType
$mOperationType_UPDATE_SERVICE :: forall {r}. OperationType -> ((# #) -> r) -> ((# #) -> r) -> r
OperationType_UPDATE_SERVICE = OperationType' "UPDATE_SERVICE"

{-# COMPLETE
  OperationType_CREATE_NAMESPACE,
  OperationType_DELETE_NAMESPACE,
  OperationType_DEREGISTER_INSTANCE,
  OperationType_REGISTER_INSTANCE,
  OperationType_UPDATE_NAMESPACE,
  OperationType_UPDATE_SERVICE,
  OperationType'
  #-}