module Stratosphere.Logs.Transformer.UpperCaseStringProperty (
UpperCaseStringProperty(..), mkUpperCaseStringProperty
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import Stratosphere.ResourceProperties
import Stratosphere.Value
data UpperCaseStringProperty
=
UpperCaseStringProperty {UpperCaseStringProperty -> ()
haddock_workaround_ :: (),
UpperCaseStringProperty -> ValueList Text
withKeys :: (ValueList Prelude.Text)}
deriving stock (UpperCaseStringProperty -> UpperCaseStringProperty -> Bool
(UpperCaseStringProperty -> UpperCaseStringProperty -> Bool)
-> (UpperCaseStringProperty -> UpperCaseStringProperty -> Bool)
-> Eq UpperCaseStringProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: UpperCaseStringProperty -> UpperCaseStringProperty -> Bool
== :: UpperCaseStringProperty -> UpperCaseStringProperty -> Bool
$c/= :: UpperCaseStringProperty -> UpperCaseStringProperty -> Bool
/= :: UpperCaseStringProperty -> UpperCaseStringProperty -> Bool
Prelude.Eq, Int -> UpperCaseStringProperty -> ShowS
[UpperCaseStringProperty] -> ShowS
UpperCaseStringProperty -> String
(Int -> UpperCaseStringProperty -> ShowS)
-> (UpperCaseStringProperty -> String)
-> ([UpperCaseStringProperty] -> ShowS)
-> Show UpperCaseStringProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> UpperCaseStringProperty -> ShowS
showsPrec :: Int -> UpperCaseStringProperty -> ShowS
$cshow :: UpperCaseStringProperty -> String
show :: UpperCaseStringProperty -> String
$cshowList :: [UpperCaseStringProperty] -> ShowS
showList :: [UpperCaseStringProperty] -> ShowS
Prelude.Show)
mkUpperCaseStringProperty ::
ValueList Prelude.Text -> UpperCaseStringProperty
mkUpperCaseStringProperty :: ValueList Text -> UpperCaseStringProperty
mkUpperCaseStringProperty ValueList Text
withKeys
= UpperCaseStringProperty
{haddock_workaround_ :: ()
haddock_workaround_ = (), withKeys :: ValueList Text
withKeys = ValueList Text
withKeys}
instance ToResourceProperties UpperCaseStringProperty where
toResourceProperties :: UpperCaseStringProperty -> ResourceProperties
toResourceProperties UpperCaseStringProperty {()
ValueList Text
haddock_workaround_ :: UpperCaseStringProperty -> ()
withKeys :: UpperCaseStringProperty -> ValueList Text
haddock_workaround_ :: ()
withKeys :: ValueList Text
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::Logs::Transformer.UpperCaseString",
supportsTags :: Bool
supportsTags = Bool
Prelude.False,
properties :: Object
properties = [Key
"WithKeys" Key -> ValueList Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= ValueList Text
withKeys]}
instance JSON.ToJSON UpperCaseStringProperty where
toJSON :: UpperCaseStringProperty -> Value
toJSON UpperCaseStringProperty {()
ValueList Text
haddock_workaround_ :: UpperCaseStringProperty -> ()
withKeys :: UpperCaseStringProperty -> ValueList Text
haddock_workaround_ :: ()
withKeys :: ValueList Text
..}
= [(Key, Value)] -> Value
JSON.object [Key
"WithKeys" Key -> ValueList Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= ValueList Text
withKeys]
instance Property "WithKeys" UpperCaseStringProperty where
type PropertyType "WithKeys" UpperCaseStringProperty = ValueList Prelude.Text
set :: PropertyType "WithKeys" UpperCaseStringProperty
-> UpperCaseStringProperty -> UpperCaseStringProperty
set PropertyType "WithKeys" UpperCaseStringProperty
newValue UpperCaseStringProperty {()
ValueList Text
haddock_workaround_ :: UpperCaseStringProperty -> ()
withKeys :: UpperCaseStringProperty -> ValueList Text
haddock_workaround_ :: ()
withKeys :: ValueList Text
..}
= UpperCaseStringProperty {withKeys :: ValueList Text
withKeys = PropertyType "WithKeys" UpperCaseStringProperty
ValueList Text
newValue, ()
haddock_workaround_ :: ()
haddock_workaround_ :: ()
..}