module Stratosphere.LookoutMetrics.AnomalyDetector.RDSSourceConfigProperty (
module Exports, RDSSourceConfigProperty(..),
mkRDSSourceConfigProperty
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.LookoutMetrics.AnomalyDetector.VpcConfigurationProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Value
data RDSSourceConfigProperty
=
RDSSourceConfigProperty {RDSSourceConfigProperty -> ()
haddock_workaround_ :: (),
RDSSourceConfigProperty -> Value Text
dBInstanceIdentifier :: (Value Prelude.Text),
RDSSourceConfigProperty -> Value Text
databaseHost :: (Value Prelude.Text),
RDSSourceConfigProperty -> Value Text
databaseName :: (Value Prelude.Text),
RDSSourceConfigProperty -> Value Integer
databasePort :: (Value Prelude.Integer),
RDSSourceConfigProperty -> Value Text
roleArn :: (Value Prelude.Text),
RDSSourceConfigProperty -> Value Text
secretManagerArn :: (Value Prelude.Text),
RDSSourceConfigProperty -> Value Text
tableName :: (Value Prelude.Text),
RDSSourceConfigProperty -> VpcConfigurationProperty
vpcConfiguration :: VpcConfigurationProperty}
deriving stock (RDSSourceConfigProperty -> RDSSourceConfigProperty -> Bool
(RDSSourceConfigProperty -> RDSSourceConfigProperty -> Bool)
-> (RDSSourceConfigProperty -> RDSSourceConfigProperty -> Bool)
-> Eq RDSSourceConfigProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: RDSSourceConfigProperty -> RDSSourceConfigProperty -> Bool
== :: RDSSourceConfigProperty -> RDSSourceConfigProperty -> Bool
$c/= :: RDSSourceConfigProperty -> RDSSourceConfigProperty -> Bool
/= :: RDSSourceConfigProperty -> RDSSourceConfigProperty -> Bool
Prelude.Eq, Int -> RDSSourceConfigProperty -> ShowS
[RDSSourceConfigProperty] -> ShowS
RDSSourceConfigProperty -> String
(Int -> RDSSourceConfigProperty -> ShowS)
-> (RDSSourceConfigProperty -> String)
-> ([RDSSourceConfigProperty] -> ShowS)
-> Show RDSSourceConfigProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> RDSSourceConfigProperty -> ShowS
showsPrec :: Int -> RDSSourceConfigProperty -> ShowS
$cshow :: RDSSourceConfigProperty -> String
show :: RDSSourceConfigProperty -> String
$cshowList :: [RDSSourceConfigProperty] -> ShowS
showList :: [RDSSourceConfigProperty] -> ShowS
Prelude.Show)
mkRDSSourceConfigProperty ::
Value Prelude.Text
-> Value Prelude.Text
-> Value Prelude.Text
-> Value Prelude.Integer
-> Value Prelude.Text
-> Value Prelude.Text
-> Value Prelude.Text
-> VpcConfigurationProperty -> RDSSourceConfigProperty
mkRDSSourceConfigProperty :: Value Text
-> Value Text
-> Value Text
-> Value Integer
-> Value Text
-> Value Text
-> Value Text
-> VpcConfigurationProperty
-> RDSSourceConfigProperty
mkRDSSourceConfigProperty
Value Text
dBInstanceIdentifier
Value Text
databaseHost
Value Text
databaseName
Value Integer
databasePort
Value Text
roleArn
Value Text
secretManagerArn
Value Text
tableName
VpcConfigurationProperty
vpcConfiguration
= RDSSourceConfigProperty
{haddock_workaround_ :: ()
haddock_workaround_ = (),
dBInstanceIdentifier :: Value Text
dBInstanceIdentifier = Value Text
dBInstanceIdentifier,
databaseHost :: Value Text
databaseHost = Value Text
databaseHost, databaseName :: Value Text
databaseName = Value Text
databaseName,
databasePort :: Value Integer
databasePort = Value Integer
databasePort, roleArn :: Value Text
roleArn = Value Text
roleArn,
secretManagerArn :: Value Text
secretManagerArn = Value Text
secretManagerArn, tableName :: Value Text
tableName = Value Text
tableName,
vpcConfiguration :: VpcConfigurationProperty
vpcConfiguration = VpcConfigurationProperty
vpcConfiguration}
instance ToResourceProperties RDSSourceConfigProperty where
toResourceProperties :: RDSSourceConfigProperty -> ResourceProperties
toResourceProperties RDSSourceConfigProperty {()
Value Integer
Value Text
VpcConfigurationProperty
haddock_workaround_ :: RDSSourceConfigProperty -> ()
dBInstanceIdentifier :: RDSSourceConfigProperty -> Value Text
databaseHost :: RDSSourceConfigProperty -> Value Text
databaseName :: RDSSourceConfigProperty -> Value Text
databasePort :: RDSSourceConfigProperty -> Value Integer
roleArn :: RDSSourceConfigProperty -> Value Text
secretManagerArn :: RDSSourceConfigProperty -> Value Text
tableName :: RDSSourceConfigProperty -> Value Text
vpcConfiguration :: RDSSourceConfigProperty -> VpcConfigurationProperty
haddock_workaround_ :: ()
dBInstanceIdentifier :: Value Text
databaseHost :: Value Text
databaseName :: Value Text
databasePort :: Value Integer
roleArn :: Value Text
secretManagerArn :: Value Text
tableName :: Value Text
vpcConfiguration :: VpcConfigurationProperty
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::LookoutMetrics::AnomalyDetector.RDSSourceConfig",
supportsTags :: Bool
supportsTags = Bool
Prelude.False,
properties :: Object
properties = [Key
"DBInstanceIdentifier" 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
dBInstanceIdentifier,
Key
"DatabaseHost" 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
databaseHost,
Key
"DatabaseName" 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
databaseName,
Key
"DatabasePort" Key -> Value Integer -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Value Integer
databasePort, Key
"RoleArn" 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
roleArn,
Key
"SecretManagerArn" 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
secretManagerArn,
Key
"TableName" 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
tableName,
Key
"VpcConfiguration" Key -> VpcConfigurationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= VpcConfigurationProperty
vpcConfiguration]}
instance JSON.ToJSON RDSSourceConfigProperty where
toJSON :: RDSSourceConfigProperty -> Value
toJSON RDSSourceConfigProperty {()
Value Integer
Value Text
VpcConfigurationProperty
haddock_workaround_ :: RDSSourceConfigProperty -> ()
dBInstanceIdentifier :: RDSSourceConfigProperty -> Value Text
databaseHost :: RDSSourceConfigProperty -> Value Text
databaseName :: RDSSourceConfigProperty -> Value Text
databasePort :: RDSSourceConfigProperty -> Value Integer
roleArn :: RDSSourceConfigProperty -> Value Text
secretManagerArn :: RDSSourceConfigProperty -> Value Text
tableName :: RDSSourceConfigProperty -> Value Text
vpcConfiguration :: RDSSourceConfigProperty -> VpcConfigurationProperty
haddock_workaround_ :: ()
dBInstanceIdentifier :: Value Text
databaseHost :: Value Text
databaseName :: Value Text
databasePort :: Value Integer
roleArn :: Value Text
secretManagerArn :: Value Text
tableName :: Value Text
vpcConfiguration :: VpcConfigurationProperty
..}
= [(Key, Value)] -> Value
JSON.object
[Key
"DBInstanceIdentifier" 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
dBInstanceIdentifier,
Key
"DatabaseHost" 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
databaseHost,
Key
"DatabaseName" 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
databaseName,
Key
"DatabasePort" Key -> Value Integer -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Value Integer
databasePort, Key
"RoleArn" 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
roleArn,
Key
"SecretManagerArn" 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
secretManagerArn,
Key
"TableName" 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
tableName,
Key
"VpcConfiguration" Key -> VpcConfigurationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= VpcConfigurationProperty
vpcConfiguration]
instance Property "DBInstanceIdentifier" RDSSourceConfigProperty where
type PropertyType "DBInstanceIdentifier" RDSSourceConfigProperty = Value Prelude.Text
set :: PropertyType "DBInstanceIdentifier" RDSSourceConfigProperty
-> RDSSourceConfigProperty -> RDSSourceConfigProperty
set PropertyType "DBInstanceIdentifier" RDSSourceConfigProperty
newValue RDSSourceConfigProperty {()
Value Integer
Value Text
VpcConfigurationProperty
haddock_workaround_ :: RDSSourceConfigProperty -> ()
dBInstanceIdentifier :: RDSSourceConfigProperty -> Value Text
databaseHost :: RDSSourceConfigProperty -> Value Text
databaseName :: RDSSourceConfigProperty -> Value Text
databasePort :: RDSSourceConfigProperty -> Value Integer
roleArn :: RDSSourceConfigProperty -> Value Text
secretManagerArn :: RDSSourceConfigProperty -> Value Text
tableName :: RDSSourceConfigProperty -> Value Text
vpcConfiguration :: RDSSourceConfigProperty -> VpcConfigurationProperty
haddock_workaround_ :: ()
dBInstanceIdentifier :: Value Text
databaseHost :: Value Text
databaseName :: Value Text
databasePort :: Value Integer
roleArn :: Value Text
secretManagerArn :: Value Text
tableName :: Value Text
vpcConfiguration :: VpcConfigurationProperty
..}
= RDSSourceConfigProperty {dBInstanceIdentifier :: Value Text
dBInstanceIdentifier = PropertyType "DBInstanceIdentifier" RDSSourceConfigProperty
Value Text
newValue, ()
Value Integer
Value Text
VpcConfigurationProperty
haddock_workaround_ :: ()
databaseHost :: Value Text
databaseName :: Value Text
databasePort :: Value Integer
roleArn :: Value Text
secretManagerArn :: Value Text
tableName :: Value Text
vpcConfiguration :: VpcConfigurationProperty
haddock_workaround_ :: ()
databaseHost :: Value Text
databaseName :: Value Text
databasePort :: Value Integer
roleArn :: Value Text
secretManagerArn :: Value Text
tableName :: Value Text
vpcConfiguration :: VpcConfigurationProperty
..}
instance Property "DatabaseHost" RDSSourceConfigProperty where
type PropertyType "DatabaseHost" RDSSourceConfigProperty = Value Prelude.Text
set :: PropertyType "DatabaseHost" RDSSourceConfigProperty
-> RDSSourceConfigProperty -> RDSSourceConfigProperty
set PropertyType "DatabaseHost" RDSSourceConfigProperty
newValue RDSSourceConfigProperty {()
Value Integer
Value Text
VpcConfigurationProperty
haddock_workaround_ :: RDSSourceConfigProperty -> ()
dBInstanceIdentifier :: RDSSourceConfigProperty -> Value Text
databaseHost :: RDSSourceConfigProperty -> Value Text
databaseName :: RDSSourceConfigProperty -> Value Text
databasePort :: RDSSourceConfigProperty -> Value Integer
roleArn :: RDSSourceConfigProperty -> Value Text
secretManagerArn :: RDSSourceConfigProperty -> Value Text
tableName :: RDSSourceConfigProperty -> Value Text
vpcConfiguration :: RDSSourceConfigProperty -> VpcConfigurationProperty
haddock_workaround_ :: ()
dBInstanceIdentifier :: Value Text
databaseHost :: Value Text
databaseName :: Value Text
databasePort :: Value Integer
roleArn :: Value Text
secretManagerArn :: Value Text
tableName :: Value Text
vpcConfiguration :: VpcConfigurationProperty
..}
= RDSSourceConfigProperty {databaseHost :: Value Text
databaseHost = PropertyType "DatabaseHost" RDSSourceConfigProperty
Value Text
newValue, ()
Value Integer
Value Text
VpcConfigurationProperty
haddock_workaround_ :: ()
dBInstanceIdentifier :: Value Text
databaseName :: Value Text
databasePort :: Value Integer
roleArn :: Value Text
secretManagerArn :: Value Text
tableName :: Value Text
vpcConfiguration :: VpcConfigurationProperty
haddock_workaround_ :: ()
dBInstanceIdentifier :: Value Text
databaseName :: Value Text
databasePort :: Value Integer
roleArn :: Value Text
secretManagerArn :: Value Text
tableName :: Value Text
vpcConfiguration :: VpcConfigurationProperty
..}
instance Property "DatabaseName" RDSSourceConfigProperty where
type PropertyType "DatabaseName" RDSSourceConfigProperty = Value Prelude.Text
set :: PropertyType "DatabaseName" RDSSourceConfigProperty
-> RDSSourceConfigProperty -> RDSSourceConfigProperty
set PropertyType "DatabaseName" RDSSourceConfigProperty
newValue RDSSourceConfigProperty {()
Value Integer
Value Text
VpcConfigurationProperty
haddock_workaround_ :: RDSSourceConfigProperty -> ()
dBInstanceIdentifier :: RDSSourceConfigProperty -> Value Text
databaseHost :: RDSSourceConfigProperty -> Value Text
databaseName :: RDSSourceConfigProperty -> Value Text
databasePort :: RDSSourceConfigProperty -> Value Integer
roleArn :: RDSSourceConfigProperty -> Value Text
secretManagerArn :: RDSSourceConfigProperty -> Value Text
tableName :: RDSSourceConfigProperty -> Value Text
vpcConfiguration :: RDSSourceConfigProperty -> VpcConfigurationProperty
haddock_workaround_ :: ()
dBInstanceIdentifier :: Value Text
databaseHost :: Value Text
databaseName :: Value Text
databasePort :: Value Integer
roleArn :: Value Text
secretManagerArn :: Value Text
tableName :: Value Text
vpcConfiguration :: VpcConfigurationProperty
..}
= RDSSourceConfigProperty {databaseName :: Value Text
databaseName = PropertyType "DatabaseName" RDSSourceConfigProperty
Value Text
newValue, ()
Value Integer
Value Text
VpcConfigurationProperty
haddock_workaround_ :: ()
dBInstanceIdentifier :: Value Text
databaseHost :: Value Text
databasePort :: Value Integer
roleArn :: Value Text
secretManagerArn :: Value Text
tableName :: Value Text
vpcConfiguration :: VpcConfigurationProperty
haddock_workaround_ :: ()
dBInstanceIdentifier :: Value Text
databaseHost :: Value Text
databasePort :: Value Integer
roleArn :: Value Text
secretManagerArn :: Value Text
tableName :: Value Text
vpcConfiguration :: VpcConfigurationProperty
..}
instance Property "DatabasePort" RDSSourceConfigProperty where
type PropertyType "DatabasePort" RDSSourceConfigProperty = Value Prelude.Integer
set :: PropertyType "DatabasePort" RDSSourceConfigProperty
-> RDSSourceConfigProperty -> RDSSourceConfigProperty
set PropertyType "DatabasePort" RDSSourceConfigProperty
newValue RDSSourceConfigProperty {()
Value Integer
Value Text
VpcConfigurationProperty
haddock_workaround_ :: RDSSourceConfigProperty -> ()
dBInstanceIdentifier :: RDSSourceConfigProperty -> Value Text
databaseHost :: RDSSourceConfigProperty -> Value Text
databaseName :: RDSSourceConfigProperty -> Value Text
databasePort :: RDSSourceConfigProperty -> Value Integer
roleArn :: RDSSourceConfigProperty -> Value Text
secretManagerArn :: RDSSourceConfigProperty -> Value Text
tableName :: RDSSourceConfigProperty -> Value Text
vpcConfiguration :: RDSSourceConfigProperty -> VpcConfigurationProperty
haddock_workaround_ :: ()
dBInstanceIdentifier :: Value Text
databaseHost :: Value Text
databaseName :: Value Text
databasePort :: Value Integer
roleArn :: Value Text
secretManagerArn :: Value Text
tableName :: Value Text
vpcConfiguration :: VpcConfigurationProperty
..}
= RDSSourceConfigProperty {databasePort :: Value Integer
databasePort = PropertyType "DatabasePort" RDSSourceConfigProperty
Value Integer
newValue, ()
Value Text
VpcConfigurationProperty
haddock_workaround_ :: ()
dBInstanceIdentifier :: Value Text
databaseHost :: Value Text
databaseName :: Value Text
roleArn :: Value Text
secretManagerArn :: Value Text
tableName :: Value Text
vpcConfiguration :: VpcConfigurationProperty
haddock_workaround_ :: ()
dBInstanceIdentifier :: Value Text
databaseHost :: Value Text
databaseName :: Value Text
roleArn :: Value Text
secretManagerArn :: Value Text
tableName :: Value Text
vpcConfiguration :: VpcConfigurationProperty
..}
instance Property "RoleArn" RDSSourceConfigProperty where
type PropertyType "RoleArn" RDSSourceConfigProperty = Value Prelude.Text
set :: PropertyType "RoleArn" RDSSourceConfigProperty
-> RDSSourceConfigProperty -> RDSSourceConfigProperty
set PropertyType "RoleArn" RDSSourceConfigProperty
newValue RDSSourceConfigProperty {()
Value Integer
Value Text
VpcConfigurationProperty
haddock_workaround_ :: RDSSourceConfigProperty -> ()
dBInstanceIdentifier :: RDSSourceConfigProperty -> Value Text
databaseHost :: RDSSourceConfigProperty -> Value Text
databaseName :: RDSSourceConfigProperty -> Value Text
databasePort :: RDSSourceConfigProperty -> Value Integer
roleArn :: RDSSourceConfigProperty -> Value Text
secretManagerArn :: RDSSourceConfigProperty -> Value Text
tableName :: RDSSourceConfigProperty -> Value Text
vpcConfiguration :: RDSSourceConfigProperty -> VpcConfigurationProperty
haddock_workaround_ :: ()
dBInstanceIdentifier :: Value Text
databaseHost :: Value Text
databaseName :: Value Text
databasePort :: Value Integer
roleArn :: Value Text
secretManagerArn :: Value Text
tableName :: Value Text
vpcConfiguration :: VpcConfigurationProperty
..}
= RDSSourceConfigProperty {roleArn :: Value Text
roleArn = PropertyType "RoleArn" RDSSourceConfigProperty
Value Text
newValue, ()
Value Integer
Value Text
VpcConfigurationProperty
haddock_workaround_ :: ()
dBInstanceIdentifier :: Value Text
databaseHost :: Value Text
databaseName :: Value Text
databasePort :: Value Integer
secretManagerArn :: Value Text
tableName :: Value Text
vpcConfiguration :: VpcConfigurationProperty
haddock_workaround_ :: ()
dBInstanceIdentifier :: Value Text
databaseHost :: Value Text
databaseName :: Value Text
databasePort :: Value Integer
secretManagerArn :: Value Text
tableName :: Value Text
vpcConfiguration :: VpcConfigurationProperty
..}
instance Property "SecretManagerArn" RDSSourceConfigProperty where
type PropertyType "SecretManagerArn" RDSSourceConfigProperty = Value Prelude.Text
set :: PropertyType "SecretManagerArn" RDSSourceConfigProperty
-> RDSSourceConfigProperty -> RDSSourceConfigProperty
set PropertyType "SecretManagerArn" RDSSourceConfigProperty
newValue RDSSourceConfigProperty {()
Value Integer
Value Text
VpcConfigurationProperty
haddock_workaround_ :: RDSSourceConfigProperty -> ()
dBInstanceIdentifier :: RDSSourceConfigProperty -> Value Text
databaseHost :: RDSSourceConfigProperty -> Value Text
databaseName :: RDSSourceConfigProperty -> Value Text
databasePort :: RDSSourceConfigProperty -> Value Integer
roleArn :: RDSSourceConfigProperty -> Value Text
secretManagerArn :: RDSSourceConfigProperty -> Value Text
tableName :: RDSSourceConfigProperty -> Value Text
vpcConfiguration :: RDSSourceConfigProperty -> VpcConfigurationProperty
haddock_workaround_ :: ()
dBInstanceIdentifier :: Value Text
databaseHost :: Value Text
databaseName :: Value Text
databasePort :: Value Integer
roleArn :: Value Text
secretManagerArn :: Value Text
tableName :: Value Text
vpcConfiguration :: VpcConfigurationProperty
..}
= RDSSourceConfigProperty {secretManagerArn :: Value Text
secretManagerArn = PropertyType "SecretManagerArn" RDSSourceConfigProperty
Value Text
newValue, ()
Value Integer
Value Text
VpcConfigurationProperty
haddock_workaround_ :: ()
dBInstanceIdentifier :: Value Text
databaseHost :: Value Text
databaseName :: Value Text
databasePort :: Value Integer
roleArn :: Value Text
tableName :: Value Text
vpcConfiguration :: VpcConfigurationProperty
haddock_workaround_ :: ()
dBInstanceIdentifier :: Value Text
databaseHost :: Value Text
databaseName :: Value Text
databasePort :: Value Integer
roleArn :: Value Text
tableName :: Value Text
vpcConfiguration :: VpcConfigurationProperty
..}
instance Property "TableName" RDSSourceConfigProperty where
type PropertyType "TableName" RDSSourceConfigProperty = Value Prelude.Text
set :: PropertyType "TableName" RDSSourceConfigProperty
-> RDSSourceConfigProperty -> RDSSourceConfigProperty
set PropertyType "TableName" RDSSourceConfigProperty
newValue RDSSourceConfigProperty {()
Value Integer
Value Text
VpcConfigurationProperty
haddock_workaround_ :: RDSSourceConfigProperty -> ()
dBInstanceIdentifier :: RDSSourceConfigProperty -> Value Text
databaseHost :: RDSSourceConfigProperty -> Value Text
databaseName :: RDSSourceConfigProperty -> Value Text
databasePort :: RDSSourceConfigProperty -> Value Integer
roleArn :: RDSSourceConfigProperty -> Value Text
secretManagerArn :: RDSSourceConfigProperty -> Value Text
tableName :: RDSSourceConfigProperty -> Value Text
vpcConfiguration :: RDSSourceConfigProperty -> VpcConfigurationProperty
haddock_workaround_ :: ()
dBInstanceIdentifier :: Value Text
databaseHost :: Value Text
databaseName :: Value Text
databasePort :: Value Integer
roleArn :: Value Text
secretManagerArn :: Value Text
tableName :: Value Text
vpcConfiguration :: VpcConfigurationProperty
..}
= RDSSourceConfigProperty {tableName :: Value Text
tableName = PropertyType "TableName" RDSSourceConfigProperty
Value Text
newValue, ()
Value Integer
Value Text
VpcConfigurationProperty
haddock_workaround_ :: ()
dBInstanceIdentifier :: Value Text
databaseHost :: Value Text
databaseName :: Value Text
databasePort :: Value Integer
roleArn :: Value Text
secretManagerArn :: Value Text
vpcConfiguration :: VpcConfigurationProperty
haddock_workaround_ :: ()
dBInstanceIdentifier :: Value Text
databaseHost :: Value Text
databaseName :: Value Text
databasePort :: Value Integer
roleArn :: Value Text
secretManagerArn :: Value Text
vpcConfiguration :: VpcConfigurationProperty
..}
instance Property "VpcConfiguration" RDSSourceConfigProperty where
type PropertyType "VpcConfiguration" RDSSourceConfigProperty = VpcConfigurationProperty
set :: PropertyType "VpcConfiguration" RDSSourceConfigProperty
-> RDSSourceConfigProperty -> RDSSourceConfigProperty
set PropertyType "VpcConfiguration" RDSSourceConfigProperty
newValue RDSSourceConfigProperty {()
Value Integer
Value Text
VpcConfigurationProperty
haddock_workaround_ :: RDSSourceConfigProperty -> ()
dBInstanceIdentifier :: RDSSourceConfigProperty -> Value Text
databaseHost :: RDSSourceConfigProperty -> Value Text
databaseName :: RDSSourceConfigProperty -> Value Text
databasePort :: RDSSourceConfigProperty -> Value Integer
roleArn :: RDSSourceConfigProperty -> Value Text
secretManagerArn :: RDSSourceConfigProperty -> Value Text
tableName :: RDSSourceConfigProperty -> Value Text
vpcConfiguration :: RDSSourceConfigProperty -> VpcConfigurationProperty
haddock_workaround_ :: ()
dBInstanceIdentifier :: Value Text
databaseHost :: Value Text
databaseName :: Value Text
databasePort :: Value Integer
roleArn :: Value Text
secretManagerArn :: Value Text
tableName :: Value Text
vpcConfiguration :: VpcConfigurationProperty
..}
= RDSSourceConfigProperty {vpcConfiguration :: VpcConfigurationProperty
vpcConfiguration = PropertyType "VpcConfiguration" RDSSourceConfigProperty
VpcConfigurationProperty
newValue, ()
Value Integer
Value Text
haddock_workaround_ :: ()
dBInstanceIdentifier :: Value Text
databaseHost :: Value Text
databaseName :: Value Text
databasePort :: Value Integer
roleArn :: Value Text
secretManagerArn :: Value Text
tableName :: Value Text
haddock_workaround_ :: ()
dBInstanceIdentifier :: Value Text
databaseHost :: Value Text
databaseName :: Value Text
databasePort :: Value Integer
roleArn :: Value Text
secretManagerArn :: Value Text
tableName :: Value Text
..}