module Stratosphere.Logs.Transformer.LowerCaseStringProperty (
        LowerCaseStringProperty(..), mkLowerCaseStringProperty
    ) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import Stratosphere.ResourceProperties
import Stratosphere.Value
data LowerCaseStringProperty
  = -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-logs-transformer-lowercasestring.html>
    LowerCaseStringProperty {LowerCaseStringProperty -> ()
haddock_workaround_ :: (),
                             -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-logs-transformer-lowercasestring.html#cfn-logs-transformer-lowercasestring-withkeys>
                             LowerCaseStringProperty -> ValueList Text
withKeys :: (ValueList Prelude.Text)}
  deriving stock (LowerCaseStringProperty -> LowerCaseStringProperty -> Bool
(LowerCaseStringProperty -> LowerCaseStringProperty -> Bool)
-> (LowerCaseStringProperty -> LowerCaseStringProperty -> Bool)
-> Eq LowerCaseStringProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: LowerCaseStringProperty -> LowerCaseStringProperty -> Bool
== :: LowerCaseStringProperty -> LowerCaseStringProperty -> Bool
$c/= :: LowerCaseStringProperty -> LowerCaseStringProperty -> Bool
/= :: LowerCaseStringProperty -> LowerCaseStringProperty -> Bool
Prelude.Eq, Int -> LowerCaseStringProperty -> ShowS
[LowerCaseStringProperty] -> ShowS
LowerCaseStringProperty -> String
(Int -> LowerCaseStringProperty -> ShowS)
-> (LowerCaseStringProperty -> String)
-> ([LowerCaseStringProperty] -> ShowS)
-> Show LowerCaseStringProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> LowerCaseStringProperty -> ShowS
showsPrec :: Int -> LowerCaseStringProperty -> ShowS
$cshow :: LowerCaseStringProperty -> String
show :: LowerCaseStringProperty -> String
$cshowList :: [LowerCaseStringProperty] -> ShowS
showList :: [LowerCaseStringProperty] -> ShowS
Prelude.Show)
mkLowerCaseStringProperty ::
  ValueList Prelude.Text -> LowerCaseStringProperty
mkLowerCaseStringProperty :: ValueList Text -> LowerCaseStringProperty
mkLowerCaseStringProperty ValueList Text
withKeys
  = LowerCaseStringProperty
      {haddock_workaround_ :: ()
haddock_workaround_ = (), withKeys :: ValueList Text
withKeys = ValueList Text
withKeys}
instance ToResourceProperties LowerCaseStringProperty where
  toResourceProperties :: LowerCaseStringProperty -> ResourceProperties
toResourceProperties LowerCaseStringProperty {()
ValueList Text
haddock_workaround_ :: LowerCaseStringProperty -> ()
withKeys :: LowerCaseStringProperty -> ValueList Text
haddock_workaround_ :: ()
withKeys :: ValueList Text
..}
    = ResourceProperties
        {awsType :: Text
awsType = Text
"AWS::Logs::Transformer.LowerCaseString",
         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 LowerCaseStringProperty where
  toJSON :: LowerCaseStringProperty -> Value
toJSON LowerCaseStringProperty {()
ValueList Text
haddock_workaround_ :: LowerCaseStringProperty -> ()
withKeys :: LowerCaseStringProperty -> 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" LowerCaseStringProperty where
  type PropertyType "WithKeys" LowerCaseStringProperty = ValueList Prelude.Text
  set :: PropertyType "WithKeys" LowerCaseStringProperty
-> LowerCaseStringProperty -> LowerCaseStringProperty
set PropertyType "WithKeys" LowerCaseStringProperty
newValue LowerCaseStringProperty {()
ValueList Text
haddock_workaround_ :: LowerCaseStringProperty -> ()
withKeys :: LowerCaseStringProperty -> ValueList Text
haddock_workaround_ :: ()
withKeys :: ValueList Text
..}
    = LowerCaseStringProperty {withKeys :: ValueList Text
withKeys = PropertyType "WithKeys" LowerCaseStringProperty
ValueList Text
newValue, ()
haddock_workaround_ :: ()
haddock_workaround_ :: ()
..}