{-# 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.EC2.Types.DatafeedSubscriptionState
-- 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.EC2.Types.DatafeedSubscriptionState
  ( DatafeedSubscriptionState
      ( ..,
        DatafeedSubscriptionState_Active,
        DatafeedSubscriptionState_Inactive
      ),
  )
where

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

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

pattern DatafeedSubscriptionState_Active :: DatafeedSubscriptionState
pattern $bDatafeedSubscriptionState_Active :: DatafeedSubscriptionState
$mDatafeedSubscriptionState_Active :: forall {r}.
DatafeedSubscriptionState -> ((# #) -> r) -> ((# #) -> r) -> r
DatafeedSubscriptionState_Active = DatafeedSubscriptionState' "Active"

pattern DatafeedSubscriptionState_Inactive :: DatafeedSubscriptionState
pattern $bDatafeedSubscriptionState_Inactive :: DatafeedSubscriptionState
$mDatafeedSubscriptionState_Inactive :: forall {r}.
DatafeedSubscriptionState -> ((# #) -> r) -> ((# #) -> r) -> r
DatafeedSubscriptionState_Inactive = DatafeedSubscriptionState' "Inactive"

{-# COMPLETE
  DatafeedSubscriptionState_Active,
  DatafeedSubscriptionState_Inactive,
  DatafeedSubscriptionState'
  #-}