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