module Stratosphere.APS.Scraper.ScraperLoggingConfigurationProperty (
module Exports, ScraperLoggingConfigurationProperty(..),
mkScraperLoggingConfigurationProperty
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.APS.Scraper.ScraperComponentProperty as Exports
import {-# SOURCE #-} Stratosphere.APS.Scraper.ScraperLoggingDestinationProperty as Exports
import Stratosphere.ResourceProperties
data ScraperLoggingConfigurationProperty
=
ScraperLoggingConfigurationProperty {ScraperLoggingConfigurationProperty -> ()
haddock_workaround_ :: (),
ScraperLoggingConfigurationProperty
-> ScraperLoggingDestinationProperty
loggingDestination :: ScraperLoggingDestinationProperty,
ScraperLoggingConfigurationProperty -> [ScraperComponentProperty]
scraperComponents :: [ScraperComponentProperty]}
deriving stock (ScraperLoggingConfigurationProperty
-> ScraperLoggingConfigurationProperty -> Bool
(ScraperLoggingConfigurationProperty
-> ScraperLoggingConfigurationProperty -> Bool)
-> (ScraperLoggingConfigurationProperty
-> ScraperLoggingConfigurationProperty -> Bool)
-> Eq ScraperLoggingConfigurationProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: ScraperLoggingConfigurationProperty
-> ScraperLoggingConfigurationProperty -> Bool
== :: ScraperLoggingConfigurationProperty
-> ScraperLoggingConfigurationProperty -> Bool
$c/= :: ScraperLoggingConfigurationProperty
-> ScraperLoggingConfigurationProperty -> Bool
/= :: ScraperLoggingConfigurationProperty
-> ScraperLoggingConfigurationProperty -> Bool
Prelude.Eq, Int -> ScraperLoggingConfigurationProperty -> ShowS
[ScraperLoggingConfigurationProperty] -> ShowS
ScraperLoggingConfigurationProperty -> String
(Int -> ScraperLoggingConfigurationProperty -> ShowS)
-> (ScraperLoggingConfigurationProperty -> String)
-> ([ScraperLoggingConfigurationProperty] -> ShowS)
-> Show ScraperLoggingConfigurationProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> ScraperLoggingConfigurationProperty -> ShowS
showsPrec :: Int -> ScraperLoggingConfigurationProperty -> ShowS
$cshow :: ScraperLoggingConfigurationProperty -> String
show :: ScraperLoggingConfigurationProperty -> String
$cshowList :: [ScraperLoggingConfigurationProperty] -> ShowS
showList :: [ScraperLoggingConfigurationProperty] -> ShowS
Prelude.Show)
mkScraperLoggingConfigurationProperty ::
ScraperLoggingDestinationProperty
-> [ScraperComponentProperty]
-> ScraperLoggingConfigurationProperty
mkScraperLoggingConfigurationProperty :: ScraperLoggingDestinationProperty
-> [ScraperComponentProperty]
-> ScraperLoggingConfigurationProperty
mkScraperLoggingConfigurationProperty
ScraperLoggingDestinationProperty
loggingDestination
[ScraperComponentProperty]
scraperComponents
= ScraperLoggingConfigurationProperty
{haddock_workaround_ :: ()
haddock_workaround_ = (), loggingDestination :: ScraperLoggingDestinationProperty
loggingDestination = ScraperLoggingDestinationProperty
loggingDestination,
scraperComponents :: [ScraperComponentProperty]
scraperComponents = [ScraperComponentProperty]
scraperComponents}
instance ToResourceProperties ScraperLoggingConfigurationProperty where
toResourceProperties :: ScraperLoggingConfigurationProperty -> ResourceProperties
toResourceProperties ScraperLoggingConfigurationProperty {[ScraperComponentProperty]
()
ScraperLoggingDestinationProperty
haddock_workaround_ :: ScraperLoggingConfigurationProperty -> ()
loggingDestination :: ScraperLoggingConfigurationProperty
-> ScraperLoggingDestinationProperty
scraperComponents :: ScraperLoggingConfigurationProperty -> [ScraperComponentProperty]
haddock_workaround_ :: ()
loggingDestination :: ScraperLoggingDestinationProperty
scraperComponents :: [ScraperComponentProperty]
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::APS::Scraper.ScraperLoggingConfiguration",
supportsTags :: Bool
supportsTags = Bool
Prelude.False,
properties :: Object
properties = [Key
"LoggingDestination" Key -> ScraperLoggingDestinationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= ScraperLoggingDestinationProperty
loggingDestination,
Key
"ScraperComponents" Key -> [ScraperComponentProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= [ScraperComponentProperty]
scraperComponents]}
instance JSON.ToJSON ScraperLoggingConfigurationProperty where
toJSON :: ScraperLoggingConfigurationProperty -> Value
toJSON ScraperLoggingConfigurationProperty {[ScraperComponentProperty]
()
ScraperLoggingDestinationProperty
haddock_workaround_ :: ScraperLoggingConfigurationProperty -> ()
loggingDestination :: ScraperLoggingConfigurationProperty
-> ScraperLoggingDestinationProperty
scraperComponents :: ScraperLoggingConfigurationProperty -> [ScraperComponentProperty]
haddock_workaround_ :: ()
loggingDestination :: ScraperLoggingDestinationProperty
scraperComponents :: [ScraperComponentProperty]
..}
= [(Key, Value)] -> Value
JSON.object
[Key
"LoggingDestination" Key -> ScraperLoggingDestinationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= ScraperLoggingDestinationProperty
loggingDestination,
Key
"ScraperComponents" Key -> [ScraperComponentProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= [ScraperComponentProperty]
scraperComponents]
instance Property "LoggingDestination" ScraperLoggingConfigurationProperty where
type PropertyType "LoggingDestination" ScraperLoggingConfigurationProperty = ScraperLoggingDestinationProperty
set :: PropertyType
"LoggingDestination" ScraperLoggingConfigurationProperty
-> ScraperLoggingConfigurationProperty
-> ScraperLoggingConfigurationProperty
set PropertyType
"LoggingDestination" ScraperLoggingConfigurationProperty
newValue ScraperLoggingConfigurationProperty {[ScraperComponentProperty]
()
ScraperLoggingDestinationProperty
haddock_workaround_ :: ScraperLoggingConfigurationProperty -> ()
loggingDestination :: ScraperLoggingConfigurationProperty
-> ScraperLoggingDestinationProperty
scraperComponents :: ScraperLoggingConfigurationProperty -> [ScraperComponentProperty]
haddock_workaround_ :: ()
loggingDestination :: ScraperLoggingDestinationProperty
scraperComponents :: [ScraperComponentProperty]
..}
= ScraperLoggingConfigurationProperty
{loggingDestination :: ScraperLoggingDestinationProperty
loggingDestination = PropertyType
"LoggingDestination" ScraperLoggingConfigurationProperty
ScraperLoggingDestinationProperty
newValue, [ScraperComponentProperty]
()
haddock_workaround_ :: ()
scraperComponents :: [ScraperComponentProperty]
haddock_workaround_ :: ()
scraperComponents :: [ScraperComponentProperty]
..}
instance Property "ScraperComponents" ScraperLoggingConfigurationProperty where
type PropertyType "ScraperComponents" ScraperLoggingConfigurationProperty = [ScraperComponentProperty]
set :: PropertyType
"ScraperComponents" ScraperLoggingConfigurationProperty
-> ScraperLoggingConfigurationProperty
-> ScraperLoggingConfigurationProperty
set PropertyType
"ScraperComponents" ScraperLoggingConfigurationProperty
newValue ScraperLoggingConfigurationProperty {[ScraperComponentProperty]
()
ScraperLoggingDestinationProperty
haddock_workaround_ :: ScraperLoggingConfigurationProperty -> ()
loggingDestination :: ScraperLoggingConfigurationProperty
-> ScraperLoggingDestinationProperty
scraperComponents :: ScraperLoggingConfigurationProperty -> [ScraperComponentProperty]
haddock_workaround_ :: ()
loggingDestination :: ScraperLoggingDestinationProperty
scraperComponents :: [ScraperComponentProperty]
..}
= ScraperLoggingConfigurationProperty
{scraperComponents :: [ScraperComponentProperty]
scraperComponents = [ScraperComponentProperty]
PropertyType
"ScraperComponents" ScraperLoggingConfigurationProperty
newValue, ()
ScraperLoggingDestinationProperty
haddock_workaround_ :: ()
loggingDestination :: ScraperLoggingDestinationProperty
haddock_workaround_ :: ()
loggingDestination :: ScraperLoggingDestinationProperty
..}