module Stratosphere.NetworkFirewall.LoggingConfiguration.LogDestinationConfigProperty (
LogDestinationConfigProperty(..), mkLogDestinationConfigProperty
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import Stratosphere.ResourceProperties
import Stratosphere.Value
data LogDestinationConfigProperty
=
LogDestinationConfigProperty {LogDestinationConfigProperty -> ()
haddock_workaround_ :: (),
LogDestinationConfigProperty -> Map Text (Value Text)
logDestination :: (Prelude.Map Prelude.Text (Value Prelude.Text)),
LogDestinationConfigProperty -> Value Text
logDestinationType :: (Value Prelude.Text),
LogDestinationConfigProperty -> Value Text
logType :: (Value Prelude.Text)}
deriving stock (LogDestinationConfigProperty
-> LogDestinationConfigProperty -> Bool
(LogDestinationConfigProperty
-> LogDestinationConfigProperty -> Bool)
-> (LogDestinationConfigProperty
-> LogDestinationConfigProperty -> Bool)
-> Eq LogDestinationConfigProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: LogDestinationConfigProperty
-> LogDestinationConfigProperty -> Bool
== :: LogDestinationConfigProperty
-> LogDestinationConfigProperty -> Bool
$c/= :: LogDestinationConfigProperty
-> LogDestinationConfigProperty -> Bool
/= :: LogDestinationConfigProperty
-> LogDestinationConfigProperty -> Bool
Prelude.Eq, Int -> LogDestinationConfigProperty -> ShowS
[LogDestinationConfigProperty] -> ShowS
LogDestinationConfigProperty -> String
(Int -> LogDestinationConfigProperty -> ShowS)
-> (LogDestinationConfigProperty -> String)
-> ([LogDestinationConfigProperty] -> ShowS)
-> Show LogDestinationConfigProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> LogDestinationConfigProperty -> ShowS
showsPrec :: Int -> LogDestinationConfigProperty -> ShowS
$cshow :: LogDestinationConfigProperty -> String
show :: LogDestinationConfigProperty -> String
$cshowList :: [LogDestinationConfigProperty] -> ShowS
showList :: [LogDestinationConfigProperty] -> ShowS
Prelude.Show)
mkLogDestinationConfigProperty ::
Prelude.Map Prelude.Text (Value Prelude.Text)
-> Value Prelude.Text
-> Value Prelude.Text -> LogDestinationConfigProperty
mkLogDestinationConfigProperty :: Map Text (Value Text)
-> Value Text -> Value Text -> LogDestinationConfigProperty
mkLogDestinationConfigProperty
Map Text (Value Text)
logDestination
Value Text
logDestinationType
Value Text
logType
= LogDestinationConfigProperty
{haddock_workaround_ :: ()
haddock_workaround_ = (), logDestination :: Map Text (Value Text)
logDestination = Map Text (Value Text)
logDestination,
logDestinationType :: Value Text
logDestinationType = Value Text
logDestinationType, logType :: Value Text
logType = Value Text
logType}
instance ToResourceProperties LogDestinationConfigProperty where
toResourceProperties :: LogDestinationConfigProperty -> ResourceProperties
toResourceProperties LogDestinationConfigProperty {()
Map Text (Value Text)
Value Text
haddock_workaround_ :: LogDestinationConfigProperty -> ()
logDestination :: LogDestinationConfigProperty -> Map Text (Value Text)
logDestinationType :: LogDestinationConfigProperty -> Value Text
logType :: LogDestinationConfigProperty -> Value Text
haddock_workaround_ :: ()
logDestination :: Map Text (Value Text)
logDestinationType :: Value Text
logType :: Value Text
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::NetworkFirewall::LoggingConfiguration.LogDestinationConfig",
supportsTags :: Bool
supportsTags = Bool
Prelude.False,
properties :: Object
properties = [Key
"LogDestination" Key -> Map Text (Value Text) -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Map Text (Value Text)
logDestination,
Key
"LogDestinationType" Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Value Text
logDestinationType,
Key
"LogType" Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Value Text
logType]}
instance JSON.ToJSON LogDestinationConfigProperty where
toJSON :: LogDestinationConfigProperty -> Value
toJSON LogDestinationConfigProperty {()
Map Text (Value Text)
Value Text
haddock_workaround_ :: LogDestinationConfigProperty -> ()
logDestination :: LogDestinationConfigProperty -> Map Text (Value Text)
logDestinationType :: LogDestinationConfigProperty -> Value Text
logType :: LogDestinationConfigProperty -> Value Text
haddock_workaround_ :: ()
logDestination :: Map Text (Value Text)
logDestinationType :: Value Text
logType :: Value Text
..}
= [(Key, Value)] -> Value
JSON.object
[Key
"LogDestination" Key -> Map Text (Value Text) -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Map Text (Value Text)
logDestination,
Key
"LogDestinationType" Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Value Text
logDestinationType,
Key
"LogType" Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Value Text
logType]
instance Property "LogDestination" LogDestinationConfigProperty where
type PropertyType "LogDestination" LogDestinationConfigProperty = Prelude.Map Prelude.Text (Value Prelude.Text)
set :: PropertyType "LogDestination" LogDestinationConfigProperty
-> LogDestinationConfigProperty -> LogDestinationConfigProperty
set PropertyType "LogDestination" LogDestinationConfigProperty
newValue LogDestinationConfigProperty {()
Map Text (Value Text)
Value Text
haddock_workaround_ :: LogDestinationConfigProperty -> ()
logDestination :: LogDestinationConfigProperty -> Map Text (Value Text)
logDestinationType :: LogDestinationConfigProperty -> Value Text
logType :: LogDestinationConfigProperty -> Value Text
haddock_workaround_ :: ()
logDestination :: Map Text (Value Text)
logDestinationType :: Value Text
logType :: Value Text
..}
= LogDestinationConfigProperty {logDestination :: Map Text (Value Text)
logDestination = Map Text (Value Text)
PropertyType "LogDestination" LogDestinationConfigProperty
newValue, ()
Value Text
haddock_workaround_ :: ()
logDestinationType :: Value Text
logType :: Value Text
haddock_workaround_ :: ()
logDestinationType :: Value Text
logType :: Value Text
..}
instance Property "LogDestinationType" LogDestinationConfigProperty where
type PropertyType "LogDestinationType" LogDestinationConfigProperty = Value Prelude.Text
set :: PropertyType "LogDestinationType" LogDestinationConfigProperty
-> LogDestinationConfigProperty -> LogDestinationConfigProperty
set PropertyType "LogDestinationType" LogDestinationConfigProperty
newValue LogDestinationConfigProperty {()
Map Text (Value Text)
Value Text
haddock_workaround_ :: LogDestinationConfigProperty -> ()
logDestination :: LogDestinationConfigProperty -> Map Text (Value Text)
logDestinationType :: LogDestinationConfigProperty -> Value Text
logType :: LogDestinationConfigProperty -> Value Text
haddock_workaround_ :: ()
logDestination :: Map Text (Value Text)
logDestinationType :: Value Text
logType :: Value Text
..}
= LogDestinationConfigProperty {logDestinationType :: Value Text
logDestinationType = PropertyType "LogDestinationType" LogDestinationConfigProperty
Value Text
newValue, ()
Map Text (Value Text)
Value Text
haddock_workaround_ :: ()
logDestination :: Map Text (Value Text)
logType :: Value Text
haddock_workaround_ :: ()
logDestination :: Map Text (Value Text)
logType :: Value Text
..}
instance Property "LogType" LogDestinationConfigProperty where
type PropertyType "LogType" LogDestinationConfigProperty = Value Prelude.Text
set :: PropertyType "LogType" LogDestinationConfigProperty
-> LogDestinationConfigProperty -> LogDestinationConfigProperty
set PropertyType "LogType" LogDestinationConfigProperty
newValue LogDestinationConfigProperty {()
Map Text (Value Text)
Value Text
haddock_workaround_ :: LogDestinationConfigProperty -> ()
logDestination :: LogDestinationConfigProperty -> Map Text (Value Text)
logDestinationType :: LogDestinationConfigProperty -> Value Text
logType :: LogDestinationConfigProperty -> Value Text
haddock_workaround_ :: ()
logDestination :: Map Text (Value Text)
logDestinationType :: Value Text
logType :: Value Text
..}
= LogDestinationConfigProperty {logType :: Value Text
logType = PropertyType "LogType" LogDestinationConfigProperty
Value Text
newValue, ()
Map Text (Value Text)
Value Text
haddock_workaround_ :: ()
logDestination :: Map Text (Value Text)
logDestinationType :: Value Text
haddock_workaround_ :: ()
logDestination :: Map Text (Value Text)
logDestinationType :: Value Text
..}