module Stratosphere.RUM.AppMonitor (
module Exports, AppMonitor(..), mkAppMonitor
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.RUM.AppMonitor.AppMonitorConfigurationProperty as Exports
import {-# SOURCE #-} Stratosphere.RUM.AppMonitor.CustomEventsProperty as Exports
import {-# SOURCE #-} Stratosphere.RUM.AppMonitor.DeobfuscationConfigurationProperty as Exports
import {-# SOURCE #-} Stratosphere.RUM.AppMonitor.ResourcePolicyProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Tag
import Stratosphere.Value
data AppMonitor
=
AppMonitor {AppMonitor -> ()
haddock_workaround_ :: (),
AppMonitor -> Maybe AppMonitorConfigurationProperty
appMonitorConfiguration :: (Prelude.Maybe AppMonitorConfigurationProperty),
AppMonitor -> Maybe CustomEventsProperty
customEvents :: (Prelude.Maybe CustomEventsProperty),
AppMonitor -> Maybe (Value Bool)
cwLogEnabled :: (Prelude.Maybe (Value Prelude.Bool)),
AppMonitor -> Maybe DeobfuscationConfigurationProperty
deobfuscationConfiguration :: (Prelude.Maybe DeobfuscationConfigurationProperty),
AppMonitor -> Maybe (Value Text)
domain :: (Prelude.Maybe (Value Prelude.Text)),
AppMonitor -> Maybe (ValueList Text)
domainList :: (Prelude.Maybe (ValueList Prelude.Text)),
AppMonitor -> Value Text
name :: (Value Prelude.Text),
AppMonitor -> Maybe ResourcePolicyProperty
resourcePolicy :: (Prelude.Maybe ResourcePolicyProperty),
AppMonitor -> Maybe [Tag]
tags :: (Prelude.Maybe [Tag])}
deriving stock (AppMonitor -> AppMonitor -> Bool
(AppMonitor -> AppMonitor -> Bool)
-> (AppMonitor -> AppMonitor -> Bool) -> Eq AppMonitor
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: AppMonitor -> AppMonitor -> Bool
== :: AppMonitor -> AppMonitor -> Bool
$c/= :: AppMonitor -> AppMonitor -> Bool
/= :: AppMonitor -> AppMonitor -> Bool
Prelude.Eq, Int -> AppMonitor -> ShowS
[AppMonitor] -> ShowS
AppMonitor -> String
(Int -> AppMonitor -> ShowS)
-> (AppMonitor -> String)
-> ([AppMonitor] -> ShowS)
-> Show AppMonitor
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> AppMonitor -> ShowS
showsPrec :: Int -> AppMonitor -> ShowS
$cshow :: AppMonitor -> String
show :: AppMonitor -> String
$cshowList :: [AppMonitor] -> ShowS
showList :: [AppMonitor] -> ShowS
Prelude.Show)
mkAppMonitor :: Value Prelude.Text -> AppMonitor
mkAppMonitor :: Value Text -> AppMonitor
mkAppMonitor Value Text
name
= AppMonitor
{haddock_workaround_ :: ()
haddock_workaround_ = (), name :: Value Text
name = Value Text
name,
appMonitorConfiguration :: Maybe AppMonitorConfigurationProperty
appMonitorConfiguration = Maybe AppMonitorConfigurationProperty
forall a. Maybe a
Prelude.Nothing,
customEvents :: Maybe CustomEventsProperty
customEvents = Maybe CustomEventsProperty
forall a. Maybe a
Prelude.Nothing, cwLogEnabled :: Maybe (Value Bool)
cwLogEnabled = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing,
deobfuscationConfiguration :: Maybe DeobfuscationConfigurationProperty
deobfuscationConfiguration = Maybe DeobfuscationConfigurationProperty
forall a. Maybe a
Prelude.Nothing,
domain :: Maybe (Value Text)
domain = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing, domainList :: Maybe (ValueList Text)
domainList = Maybe (ValueList Text)
forall a. Maybe a
Prelude.Nothing,
resourcePolicy :: Maybe ResourcePolicyProperty
resourcePolicy = Maybe ResourcePolicyProperty
forall a. Maybe a
Prelude.Nothing, tags :: Maybe [Tag]
tags = Maybe [Tag]
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties AppMonitor where
toResourceProperties :: AppMonitor -> ResourceProperties
toResourceProperties AppMonitor {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe CustomEventsProperty
Maybe DeobfuscationConfigurationProperty
Maybe AppMonitorConfigurationProperty
Maybe ResourcePolicyProperty
()
Value Text
haddock_workaround_ :: AppMonitor -> ()
appMonitorConfiguration :: AppMonitor -> Maybe AppMonitorConfigurationProperty
customEvents :: AppMonitor -> Maybe CustomEventsProperty
cwLogEnabled :: AppMonitor -> Maybe (Value Bool)
deobfuscationConfiguration :: AppMonitor -> Maybe DeobfuscationConfigurationProperty
domain :: AppMonitor -> Maybe (Value Text)
domainList :: AppMonitor -> Maybe (ValueList Text)
name :: AppMonitor -> Value Text
resourcePolicy :: AppMonitor -> Maybe ResourcePolicyProperty
tags :: AppMonitor -> Maybe [Tag]
haddock_workaround_ :: ()
appMonitorConfiguration :: Maybe AppMonitorConfigurationProperty
customEvents :: Maybe CustomEventsProperty
cwLogEnabled :: Maybe (Value Bool)
deobfuscationConfiguration :: Maybe DeobfuscationConfigurationProperty
domain :: Maybe (Value Text)
domainList :: Maybe (ValueList Text)
name :: Value Text
resourcePolicy :: Maybe ResourcePolicyProperty
tags :: Maybe [Tag]
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::RUM::AppMonitor", supportsTags :: Bool
supportsTags = Bool
Prelude.True,
properties :: Object
properties = [Item Object] -> Object
forall l. IsList l => [Item l] -> l
Prelude.fromList
([(Key, Value)] -> [(Key, Value)] -> [(Key, Value)]
forall a. Semigroup a => a -> a -> a
(Prelude.<>)
[Key
"Name" 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
name]
([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
[Key -> AppMonitorConfigurationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"AppMonitorConfiguration"
(AppMonitorConfigurationProperty -> (Key, Value))
-> Maybe AppMonitorConfigurationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe AppMonitorConfigurationProperty
appMonitorConfiguration,
Key -> CustomEventsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"CustomEvents" (CustomEventsProperty -> (Key, Value))
-> Maybe CustomEventsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe CustomEventsProperty
customEvents,
Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"CwLogEnabled" (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
cwLogEnabled,
Key -> DeobfuscationConfigurationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"DeobfuscationConfiguration"
(DeobfuscationConfigurationProperty -> (Key, Value))
-> Maybe DeobfuscationConfigurationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe DeobfuscationConfigurationProperty
deobfuscationConfiguration,
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..=) Key
"Domain" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
domain,
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..=) Key
"DomainList" (ValueList Text -> (Key, Value))
-> Maybe (ValueList Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (ValueList Text)
domainList,
Key -> ResourcePolicyProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"ResourcePolicy" (ResourcePolicyProperty -> (Key, Value))
-> Maybe ResourcePolicyProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ResourcePolicyProperty
resourcePolicy,
Key -> [Tag] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Tags" ([Tag] -> (Key, Value)) -> Maybe [Tag] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [Tag]
tags]))}
instance JSON.ToJSON AppMonitor where
toJSON :: AppMonitor -> Value
toJSON AppMonitor {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe CustomEventsProperty
Maybe DeobfuscationConfigurationProperty
Maybe AppMonitorConfigurationProperty
Maybe ResourcePolicyProperty
()
Value Text
haddock_workaround_ :: AppMonitor -> ()
appMonitorConfiguration :: AppMonitor -> Maybe AppMonitorConfigurationProperty
customEvents :: AppMonitor -> Maybe CustomEventsProperty
cwLogEnabled :: AppMonitor -> Maybe (Value Bool)
deobfuscationConfiguration :: AppMonitor -> Maybe DeobfuscationConfigurationProperty
domain :: AppMonitor -> Maybe (Value Text)
domainList :: AppMonitor -> Maybe (ValueList Text)
name :: AppMonitor -> Value Text
resourcePolicy :: AppMonitor -> Maybe ResourcePolicyProperty
tags :: AppMonitor -> Maybe [Tag]
haddock_workaround_ :: ()
appMonitorConfiguration :: Maybe AppMonitorConfigurationProperty
customEvents :: Maybe CustomEventsProperty
cwLogEnabled :: Maybe (Value Bool)
deobfuscationConfiguration :: Maybe DeobfuscationConfigurationProperty
domain :: Maybe (Value Text)
domainList :: Maybe (ValueList Text)
name :: Value Text
resourcePolicy :: Maybe ResourcePolicyProperty
tags :: Maybe [Tag]
..}
= [(Key, Value)] -> Value
JSON.object
([Item [(Key, Value)]] -> [(Key, Value)]
forall l. IsList l => [Item l] -> l
Prelude.fromList
([(Key, Value)] -> [(Key, Value)] -> [(Key, Value)]
forall a. Semigroup a => a -> a -> a
(Prelude.<>)
[Key
"Name" 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
name]
([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
[Key -> AppMonitorConfigurationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"AppMonitorConfiguration"
(AppMonitorConfigurationProperty -> (Key, Value))
-> Maybe AppMonitorConfigurationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe AppMonitorConfigurationProperty
appMonitorConfiguration,
Key -> CustomEventsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"CustomEvents" (CustomEventsProperty -> (Key, Value))
-> Maybe CustomEventsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe CustomEventsProperty
customEvents,
Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"CwLogEnabled" (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
cwLogEnabled,
Key -> DeobfuscationConfigurationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"DeobfuscationConfiguration"
(DeobfuscationConfigurationProperty -> (Key, Value))
-> Maybe DeobfuscationConfigurationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe DeobfuscationConfigurationProperty
deobfuscationConfiguration,
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..=) Key
"Domain" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
domain,
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..=) Key
"DomainList" (ValueList Text -> (Key, Value))
-> Maybe (ValueList Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (ValueList Text)
domainList,
Key -> ResourcePolicyProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"ResourcePolicy" (ResourcePolicyProperty -> (Key, Value))
-> Maybe ResourcePolicyProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ResourcePolicyProperty
resourcePolicy,
Key -> [Tag] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Tags" ([Tag] -> (Key, Value)) -> Maybe [Tag] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [Tag]
tags])))
instance Property "AppMonitorConfiguration" AppMonitor where
type PropertyType "AppMonitorConfiguration" AppMonitor = AppMonitorConfigurationProperty
set :: PropertyType "AppMonitorConfiguration" AppMonitor
-> AppMonitor -> AppMonitor
set PropertyType "AppMonitorConfiguration" AppMonitor
newValue AppMonitor {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe CustomEventsProperty
Maybe DeobfuscationConfigurationProperty
Maybe AppMonitorConfigurationProperty
Maybe ResourcePolicyProperty
()
Value Text
haddock_workaround_ :: AppMonitor -> ()
appMonitorConfiguration :: AppMonitor -> Maybe AppMonitorConfigurationProperty
customEvents :: AppMonitor -> Maybe CustomEventsProperty
cwLogEnabled :: AppMonitor -> Maybe (Value Bool)
deobfuscationConfiguration :: AppMonitor -> Maybe DeobfuscationConfigurationProperty
domain :: AppMonitor -> Maybe (Value Text)
domainList :: AppMonitor -> Maybe (ValueList Text)
name :: AppMonitor -> Value Text
resourcePolicy :: AppMonitor -> Maybe ResourcePolicyProperty
tags :: AppMonitor -> Maybe [Tag]
haddock_workaround_ :: ()
appMonitorConfiguration :: Maybe AppMonitorConfigurationProperty
customEvents :: Maybe CustomEventsProperty
cwLogEnabled :: Maybe (Value Bool)
deobfuscationConfiguration :: Maybe DeobfuscationConfigurationProperty
domain :: Maybe (Value Text)
domainList :: Maybe (ValueList Text)
name :: Value Text
resourcePolicy :: Maybe ResourcePolicyProperty
tags :: Maybe [Tag]
..}
= AppMonitor {appMonitorConfiguration :: Maybe AppMonitorConfigurationProperty
appMonitorConfiguration = AppMonitorConfigurationProperty
-> Maybe AppMonitorConfigurationProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "AppMonitorConfiguration" AppMonitor
AppMonitorConfigurationProperty
newValue, Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe CustomEventsProperty
Maybe DeobfuscationConfigurationProperty
Maybe ResourcePolicyProperty
()
Value Text
haddock_workaround_ :: ()
customEvents :: Maybe CustomEventsProperty
cwLogEnabled :: Maybe (Value Bool)
deobfuscationConfiguration :: Maybe DeobfuscationConfigurationProperty
domain :: Maybe (Value Text)
domainList :: Maybe (ValueList Text)
name :: Value Text
resourcePolicy :: Maybe ResourcePolicyProperty
tags :: Maybe [Tag]
haddock_workaround_ :: ()
customEvents :: Maybe CustomEventsProperty
cwLogEnabled :: Maybe (Value Bool)
deobfuscationConfiguration :: Maybe DeobfuscationConfigurationProperty
domain :: Maybe (Value Text)
domainList :: Maybe (ValueList Text)
name :: Value Text
resourcePolicy :: Maybe ResourcePolicyProperty
tags :: Maybe [Tag]
..}
instance Property "CustomEvents" AppMonitor where
type PropertyType "CustomEvents" AppMonitor = CustomEventsProperty
set :: PropertyType "CustomEvents" AppMonitor -> AppMonitor -> AppMonitor
set PropertyType "CustomEvents" AppMonitor
newValue AppMonitor {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe CustomEventsProperty
Maybe DeobfuscationConfigurationProperty
Maybe AppMonitorConfigurationProperty
Maybe ResourcePolicyProperty
()
Value Text
haddock_workaround_ :: AppMonitor -> ()
appMonitorConfiguration :: AppMonitor -> Maybe AppMonitorConfigurationProperty
customEvents :: AppMonitor -> Maybe CustomEventsProperty
cwLogEnabled :: AppMonitor -> Maybe (Value Bool)
deobfuscationConfiguration :: AppMonitor -> Maybe DeobfuscationConfigurationProperty
domain :: AppMonitor -> Maybe (Value Text)
domainList :: AppMonitor -> Maybe (ValueList Text)
name :: AppMonitor -> Value Text
resourcePolicy :: AppMonitor -> Maybe ResourcePolicyProperty
tags :: AppMonitor -> Maybe [Tag]
haddock_workaround_ :: ()
appMonitorConfiguration :: Maybe AppMonitorConfigurationProperty
customEvents :: Maybe CustomEventsProperty
cwLogEnabled :: Maybe (Value Bool)
deobfuscationConfiguration :: Maybe DeobfuscationConfigurationProperty
domain :: Maybe (Value Text)
domainList :: Maybe (ValueList Text)
name :: Value Text
resourcePolicy :: Maybe ResourcePolicyProperty
tags :: Maybe [Tag]
..}
= AppMonitor {customEvents :: Maybe CustomEventsProperty
customEvents = CustomEventsProperty -> Maybe CustomEventsProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "CustomEvents" AppMonitor
CustomEventsProperty
newValue, Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe DeobfuscationConfigurationProperty
Maybe AppMonitorConfigurationProperty
Maybe ResourcePolicyProperty
()
Value Text
haddock_workaround_ :: ()
appMonitorConfiguration :: Maybe AppMonitorConfigurationProperty
cwLogEnabled :: Maybe (Value Bool)
deobfuscationConfiguration :: Maybe DeobfuscationConfigurationProperty
domain :: Maybe (Value Text)
domainList :: Maybe (ValueList Text)
name :: Value Text
resourcePolicy :: Maybe ResourcePolicyProperty
tags :: Maybe [Tag]
haddock_workaround_ :: ()
appMonitorConfiguration :: Maybe AppMonitorConfigurationProperty
cwLogEnabled :: Maybe (Value Bool)
deobfuscationConfiguration :: Maybe DeobfuscationConfigurationProperty
domain :: Maybe (Value Text)
domainList :: Maybe (ValueList Text)
name :: Value Text
resourcePolicy :: Maybe ResourcePolicyProperty
tags :: Maybe [Tag]
..}
instance Property "CwLogEnabled" AppMonitor where
type PropertyType "CwLogEnabled" AppMonitor = Value Prelude.Bool
set :: PropertyType "CwLogEnabled" AppMonitor -> AppMonitor -> AppMonitor
set PropertyType "CwLogEnabled" AppMonitor
newValue AppMonitor {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe CustomEventsProperty
Maybe DeobfuscationConfigurationProperty
Maybe AppMonitorConfigurationProperty
Maybe ResourcePolicyProperty
()
Value Text
haddock_workaround_ :: AppMonitor -> ()
appMonitorConfiguration :: AppMonitor -> Maybe AppMonitorConfigurationProperty
customEvents :: AppMonitor -> Maybe CustomEventsProperty
cwLogEnabled :: AppMonitor -> Maybe (Value Bool)
deobfuscationConfiguration :: AppMonitor -> Maybe DeobfuscationConfigurationProperty
domain :: AppMonitor -> Maybe (Value Text)
domainList :: AppMonitor -> Maybe (ValueList Text)
name :: AppMonitor -> Value Text
resourcePolicy :: AppMonitor -> Maybe ResourcePolicyProperty
tags :: AppMonitor -> Maybe [Tag]
haddock_workaround_ :: ()
appMonitorConfiguration :: Maybe AppMonitorConfigurationProperty
customEvents :: Maybe CustomEventsProperty
cwLogEnabled :: Maybe (Value Bool)
deobfuscationConfiguration :: Maybe DeobfuscationConfigurationProperty
domain :: Maybe (Value Text)
domainList :: Maybe (ValueList Text)
name :: Value Text
resourcePolicy :: Maybe ResourcePolicyProperty
tags :: Maybe [Tag]
..}
= AppMonitor {cwLogEnabled :: Maybe (Value Bool)
cwLogEnabled = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "CwLogEnabled" AppMonitor
Value Bool
newValue, Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Text)
Maybe CustomEventsProperty
Maybe DeobfuscationConfigurationProperty
Maybe AppMonitorConfigurationProperty
Maybe ResourcePolicyProperty
()
Value Text
haddock_workaround_ :: ()
appMonitorConfiguration :: Maybe AppMonitorConfigurationProperty
customEvents :: Maybe CustomEventsProperty
deobfuscationConfiguration :: Maybe DeobfuscationConfigurationProperty
domain :: Maybe (Value Text)
domainList :: Maybe (ValueList Text)
name :: Value Text
resourcePolicy :: Maybe ResourcePolicyProperty
tags :: Maybe [Tag]
haddock_workaround_ :: ()
appMonitorConfiguration :: Maybe AppMonitorConfigurationProperty
customEvents :: Maybe CustomEventsProperty
deobfuscationConfiguration :: Maybe DeobfuscationConfigurationProperty
domain :: Maybe (Value Text)
domainList :: Maybe (ValueList Text)
name :: Value Text
resourcePolicy :: Maybe ResourcePolicyProperty
tags :: Maybe [Tag]
..}
instance Property "DeobfuscationConfiguration" AppMonitor where
type PropertyType "DeobfuscationConfiguration" AppMonitor = DeobfuscationConfigurationProperty
set :: PropertyType "DeobfuscationConfiguration" AppMonitor
-> AppMonitor -> AppMonitor
set PropertyType "DeobfuscationConfiguration" AppMonitor
newValue AppMonitor {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe CustomEventsProperty
Maybe DeobfuscationConfigurationProperty
Maybe AppMonitorConfigurationProperty
Maybe ResourcePolicyProperty
()
Value Text
haddock_workaround_ :: AppMonitor -> ()
appMonitorConfiguration :: AppMonitor -> Maybe AppMonitorConfigurationProperty
customEvents :: AppMonitor -> Maybe CustomEventsProperty
cwLogEnabled :: AppMonitor -> Maybe (Value Bool)
deobfuscationConfiguration :: AppMonitor -> Maybe DeobfuscationConfigurationProperty
domain :: AppMonitor -> Maybe (Value Text)
domainList :: AppMonitor -> Maybe (ValueList Text)
name :: AppMonitor -> Value Text
resourcePolicy :: AppMonitor -> Maybe ResourcePolicyProperty
tags :: AppMonitor -> Maybe [Tag]
haddock_workaround_ :: ()
appMonitorConfiguration :: Maybe AppMonitorConfigurationProperty
customEvents :: Maybe CustomEventsProperty
cwLogEnabled :: Maybe (Value Bool)
deobfuscationConfiguration :: Maybe DeobfuscationConfigurationProperty
domain :: Maybe (Value Text)
domainList :: Maybe (ValueList Text)
name :: Value Text
resourcePolicy :: Maybe ResourcePolicyProperty
tags :: Maybe [Tag]
..}
= AppMonitor
{deobfuscationConfiguration :: Maybe DeobfuscationConfigurationProperty
deobfuscationConfiguration = DeobfuscationConfigurationProperty
-> Maybe DeobfuscationConfigurationProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "DeobfuscationConfiguration" AppMonitor
DeobfuscationConfigurationProperty
newValue, Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe CustomEventsProperty
Maybe AppMonitorConfigurationProperty
Maybe ResourcePolicyProperty
()
Value Text
haddock_workaround_ :: ()
appMonitorConfiguration :: Maybe AppMonitorConfigurationProperty
customEvents :: Maybe CustomEventsProperty
cwLogEnabled :: Maybe (Value Bool)
domain :: Maybe (Value Text)
domainList :: Maybe (ValueList Text)
name :: Value Text
resourcePolicy :: Maybe ResourcePolicyProperty
tags :: Maybe [Tag]
haddock_workaround_ :: ()
appMonitorConfiguration :: Maybe AppMonitorConfigurationProperty
customEvents :: Maybe CustomEventsProperty
cwLogEnabled :: Maybe (Value Bool)
domain :: Maybe (Value Text)
domainList :: Maybe (ValueList Text)
name :: Value Text
resourcePolicy :: Maybe ResourcePolicyProperty
tags :: Maybe [Tag]
..}
instance Property "Domain" AppMonitor where
type PropertyType "Domain" AppMonitor = Value Prelude.Text
set :: PropertyType "Domain" AppMonitor -> AppMonitor -> AppMonitor
set PropertyType "Domain" AppMonitor
newValue AppMonitor {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe CustomEventsProperty
Maybe DeobfuscationConfigurationProperty
Maybe AppMonitorConfigurationProperty
Maybe ResourcePolicyProperty
()
Value Text
haddock_workaround_ :: AppMonitor -> ()
appMonitorConfiguration :: AppMonitor -> Maybe AppMonitorConfigurationProperty
customEvents :: AppMonitor -> Maybe CustomEventsProperty
cwLogEnabled :: AppMonitor -> Maybe (Value Bool)
deobfuscationConfiguration :: AppMonitor -> Maybe DeobfuscationConfigurationProperty
domain :: AppMonitor -> Maybe (Value Text)
domainList :: AppMonitor -> Maybe (ValueList Text)
name :: AppMonitor -> Value Text
resourcePolicy :: AppMonitor -> Maybe ResourcePolicyProperty
tags :: AppMonitor -> Maybe [Tag]
haddock_workaround_ :: ()
appMonitorConfiguration :: Maybe AppMonitorConfigurationProperty
customEvents :: Maybe CustomEventsProperty
cwLogEnabled :: Maybe (Value Bool)
deobfuscationConfiguration :: Maybe DeobfuscationConfigurationProperty
domain :: Maybe (Value Text)
domainList :: Maybe (ValueList Text)
name :: Value Text
resourcePolicy :: Maybe ResourcePolicyProperty
tags :: Maybe [Tag]
..}
= AppMonitor {domain :: Maybe (Value Text)
domain = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Domain" AppMonitor
Value Text
newValue, Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe CustomEventsProperty
Maybe DeobfuscationConfigurationProperty
Maybe AppMonitorConfigurationProperty
Maybe ResourcePolicyProperty
()
Value Text
haddock_workaround_ :: ()
appMonitorConfiguration :: Maybe AppMonitorConfigurationProperty
customEvents :: Maybe CustomEventsProperty
cwLogEnabled :: Maybe (Value Bool)
deobfuscationConfiguration :: Maybe DeobfuscationConfigurationProperty
domainList :: Maybe (ValueList Text)
name :: Value Text
resourcePolicy :: Maybe ResourcePolicyProperty
tags :: Maybe [Tag]
haddock_workaround_ :: ()
appMonitorConfiguration :: Maybe AppMonitorConfigurationProperty
customEvents :: Maybe CustomEventsProperty
cwLogEnabled :: Maybe (Value Bool)
deobfuscationConfiguration :: Maybe DeobfuscationConfigurationProperty
domainList :: Maybe (ValueList Text)
name :: Value Text
resourcePolicy :: Maybe ResourcePolicyProperty
tags :: Maybe [Tag]
..}
instance Property "DomainList" AppMonitor where
type PropertyType "DomainList" AppMonitor = ValueList Prelude.Text
set :: PropertyType "DomainList" AppMonitor -> AppMonitor -> AppMonitor
set PropertyType "DomainList" AppMonitor
newValue AppMonitor {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe CustomEventsProperty
Maybe DeobfuscationConfigurationProperty
Maybe AppMonitorConfigurationProperty
Maybe ResourcePolicyProperty
()
Value Text
haddock_workaround_ :: AppMonitor -> ()
appMonitorConfiguration :: AppMonitor -> Maybe AppMonitorConfigurationProperty
customEvents :: AppMonitor -> Maybe CustomEventsProperty
cwLogEnabled :: AppMonitor -> Maybe (Value Bool)
deobfuscationConfiguration :: AppMonitor -> Maybe DeobfuscationConfigurationProperty
domain :: AppMonitor -> Maybe (Value Text)
domainList :: AppMonitor -> Maybe (ValueList Text)
name :: AppMonitor -> Value Text
resourcePolicy :: AppMonitor -> Maybe ResourcePolicyProperty
tags :: AppMonitor -> Maybe [Tag]
haddock_workaround_ :: ()
appMonitorConfiguration :: Maybe AppMonitorConfigurationProperty
customEvents :: Maybe CustomEventsProperty
cwLogEnabled :: Maybe (Value Bool)
deobfuscationConfiguration :: Maybe DeobfuscationConfigurationProperty
domain :: Maybe (Value Text)
domainList :: Maybe (ValueList Text)
name :: Value Text
resourcePolicy :: Maybe ResourcePolicyProperty
tags :: Maybe [Tag]
..}
= AppMonitor {domainList :: Maybe (ValueList Text)
domainList = ValueList Text -> Maybe (ValueList Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "DomainList" AppMonitor
ValueList Text
newValue, Maybe [Tag]
Maybe (Value Bool)
Maybe (Value Text)
Maybe CustomEventsProperty
Maybe DeobfuscationConfigurationProperty
Maybe AppMonitorConfigurationProperty
Maybe ResourcePolicyProperty
()
Value Text
haddock_workaround_ :: ()
appMonitorConfiguration :: Maybe AppMonitorConfigurationProperty
customEvents :: Maybe CustomEventsProperty
cwLogEnabled :: Maybe (Value Bool)
deobfuscationConfiguration :: Maybe DeobfuscationConfigurationProperty
domain :: Maybe (Value Text)
name :: Value Text
resourcePolicy :: Maybe ResourcePolicyProperty
tags :: Maybe [Tag]
haddock_workaround_ :: ()
appMonitorConfiguration :: Maybe AppMonitorConfigurationProperty
customEvents :: Maybe CustomEventsProperty
cwLogEnabled :: Maybe (Value Bool)
deobfuscationConfiguration :: Maybe DeobfuscationConfigurationProperty
domain :: Maybe (Value Text)
name :: Value Text
resourcePolicy :: Maybe ResourcePolicyProperty
tags :: Maybe [Tag]
..}
instance Property "Name" AppMonitor where
type PropertyType "Name" AppMonitor = Value Prelude.Text
set :: PropertyType "Name" AppMonitor -> AppMonitor -> AppMonitor
set PropertyType "Name" AppMonitor
newValue AppMonitor {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe CustomEventsProperty
Maybe DeobfuscationConfigurationProperty
Maybe AppMonitorConfigurationProperty
Maybe ResourcePolicyProperty
()
Value Text
haddock_workaround_ :: AppMonitor -> ()
appMonitorConfiguration :: AppMonitor -> Maybe AppMonitorConfigurationProperty
customEvents :: AppMonitor -> Maybe CustomEventsProperty
cwLogEnabled :: AppMonitor -> Maybe (Value Bool)
deobfuscationConfiguration :: AppMonitor -> Maybe DeobfuscationConfigurationProperty
domain :: AppMonitor -> Maybe (Value Text)
domainList :: AppMonitor -> Maybe (ValueList Text)
name :: AppMonitor -> Value Text
resourcePolicy :: AppMonitor -> Maybe ResourcePolicyProperty
tags :: AppMonitor -> Maybe [Tag]
haddock_workaround_ :: ()
appMonitorConfiguration :: Maybe AppMonitorConfigurationProperty
customEvents :: Maybe CustomEventsProperty
cwLogEnabled :: Maybe (Value Bool)
deobfuscationConfiguration :: Maybe DeobfuscationConfigurationProperty
domain :: Maybe (Value Text)
domainList :: Maybe (ValueList Text)
name :: Value Text
resourcePolicy :: Maybe ResourcePolicyProperty
tags :: Maybe [Tag]
..} = AppMonitor {name :: Value Text
name = PropertyType "Name" AppMonitor
Value Text
newValue, Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe CustomEventsProperty
Maybe DeobfuscationConfigurationProperty
Maybe AppMonitorConfigurationProperty
Maybe ResourcePolicyProperty
()
haddock_workaround_ :: ()
appMonitorConfiguration :: Maybe AppMonitorConfigurationProperty
customEvents :: Maybe CustomEventsProperty
cwLogEnabled :: Maybe (Value Bool)
deobfuscationConfiguration :: Maybe DeobfuscationConfigurationProperty
domain :: Maybe (Value Text)
domainList :: Maybe (ValueList Text)
resourcePolicy :: Maybe ResourcePolicyProperty
tags :: Maybe [Tag]
haddock_workaround_ :: ()
appMonitorConfiguration :: Maybe AppMonitorConfigurationProperty
customEvents :: Maybe CustomEventsProperty
cwLogEnabled :: Maybe (Value Bool)
deobfuscationConfiguration :: Maybe DeobfuscationConfigurationProperty
domain :: Maybe (Value Text)
domainList :: Maybe (ValueList Text)
resourcePolicy :: Maybe ResourcePolicyProperty
tags :: Maybe [Tag]
..}
instance Property "ResourcePolicy" AppMonitor where
type PropertyType "ResourcePolicy" AppMonitor = ResourcePolicyProperty
set :: PropertyType "ResourcePolicy" AppMonitor
-> AppMonitor -> AppMonitor
set PropertyType "ResourcePolicy" AppMonitor
newValue AppMonitor {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe CustomEventsProperty
Maybe DeobfuscationConfigurationProperty
Maybe AppMonitorConfigurationProperty
Maybe ResourcePolicyProperty
()
Value Text
haddock_workaround_ :: AppMonitor -> ()
appMonitorConfiguration :: AppMonitor -> Maybe AppMonitorConfigurationProperty
customEvents :: AppMonitor -> Maybe CustomEventsProperty
cwLogEnabled :: AppMonitor -> Maybe (Value Bool)
deobfuscationConfiguration :: AppMonitor -> Maybe DeobfuscationConfigurationProperty
domain :: AppMonitor -> Maybe (Value Text)
domainList :: AppMonitor -> Maybe (ValueList Text)
name :: AppMonitor -> Value Text
resourcePolicy :: AppMonitor -> Maybe ResourcePolicyProperty
tags :: AppMonitor -> Maybe [Tag]
haddock_workaround_ :: ()
appMonitorConfiguration :: Maybe AppMonitorConfigurationProperty
customEvents :: Maybe CustomEventsProperty
cwLogEnabled :: Maybe (Value Bool)
deobfuscationConfiguration :: Maybe DeobfuscationConfigurationProperty
domain :: Maybe (Value Text)
domainList :: Maybe (ValueList Text)
name :: Value Text
resourcePolicy :: Maybe ResourcePolicyProperty
tags :: Maybe [Tag]
..}
= AppMonitor {resourcePolicy :: Maybe ResourcePolicyProperty
resourcePolicy = ResourcePolicyProperty -> Maybe ResourcePolicyProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "ResourcePolicy" AppMonitor
ResourcePolicyProperty
newValue, Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe CustomEventsProperty
Maybe DeobfuscationConfigurationProperty
Maybe AppMonitorConfigurationProperty
()
Value Text
haddock_workaround_ :: ()
appMonitorConfiguration :: Maybe AppMonitorConfigurationProperty
customEvents :: Maybe CustomEventsProperty
cwLogEnabled :: Maybe (Value Bool)
deobfuscationConfiguration :: Maybe DeobfuscationConfigurationProperty
domain :: Maybe (Value Text)
domainList :: Maybe (ValueList Text)
name :: Value Text
tags :: Maybe [Tag]
haddock_workaround_ :: ()
appMonitorConfiguration :: Maybe AppMonitorConfigurationProperty
customEvents :: Maybe CustomEventsProperty
cwLogEnabled :: Maybe (Value Bool)
deobfuscationConfiguration :: Maybe DeobfuscationConfigurationProperty
domain :: Maybe (Value Text)
domainList :: Maybe (ValueList Text)
name :: Value Text
tags :: Maybe [Tag]
..}
instance Property "Tags" AppMonitor where
type PropertyType "Tags" AppMonitor = [Tag]
set :: PropertyType "Tags" AppMonitor -> AppMonitor -> AppMonitor
set PropertyType "Tags" AppMonitor
newValue AppMonitor {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe CustomEventsProperty
Maybe DeobfuscationConfigurationProperty
Maybe AppMonitorConfigurationProperty
Maybe ResourcePolicyProperty
()
Value Text
haddock_workaround_ :: AppMonitor -> ()
appMonitorConfiguration :: AppMonitor -> Maybe AppMonitorConfigurationProperty
customEvents :: AppMonitor -> Maybe CustomEventsProperty
cwLogEnabled :: AppMonitor -> Maybe (Value Bool)
deobfuscationConfiguration :: AppMonitor -> Maybe DeobfuscationConfigurationProperty
domain :: AppMonitor -> Maybe (Value Text)
domainList :: AppMonitor -> Maybe (ValueList Text)
name :: AppMonitor -> Value Text
resourcePolicy :: AppMonitor -> Maybe ResourcePolicyProperty
tags :: AppMonitor -> Maybe [Tag]
haddock_workaround_ :: ()
appMonitorConfiguration :: Maybe AppMonitorConfigurationProperty
customEvents :: Maybe CustomEventsProperty
cwLogEnabled :: Maybe (Value Bool)
deobfuscationConfiguration :: Maybe DeobfuscationConfigurationProperty
domain :: Maybe (Value Text)
domainList :: Maybe (ValueList Text)
name :: Value Text
resourcePolicy :: Maybe ResourcePolicyProperty
tags :: Maybe [Tag]
..}
= AppMonitor {tags :: Maybe [Tag]
tags = [Tag] -> Maybe [Tag]
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure [Tag]
PropertyType "Tags" AppMonitor
newValue, Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe CustomEventsProperty
Maybe DeobfuscationConfigurationProperty
Maybe AppMonitorConfigurationProperty
Maybe ResourcePolicyProperty
()
Value Text
haddock_workaround_ :: ()
appMonitorConfiguration :: Maybe AppMonitorConfigurationProperty
customEvents :: Maybe CustomEventsProperty
cwLogEnabled :: Maybe (Value Bool)
deobfuscationConfiguration :: Maybe DeobfuscationConfigurationProperty
domain :: Maybe (Value Text)
domainList :: Maybe (ValueList Text)
name :: Value Text
resourcePolicy :: Maybe ResourcePolicyProperty
haddock_workaround_ :: ()
appMonitorConfiguration :: Maybe AppMonitorConfigurationProperty
customEvents :: Maybe CustomEventsProperty
cwLogEnabled :: Maybe (Value Bool)
deobfuscationConfiguration :: Maybe DeobfuscationConfigurationProperty
domain :: Maybe (Value Text)
domainList :: Maybe (ValueList Text)
name :: Value Text
resourcePolicy :: Maybe ResourcePolicyProperty
..}