module Stratosphere.OpsWorks.Stack.RdsDbInstanceProperty (
RdsDbInstanceProperty(..), mkRdsDbInstanceProperty
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import Stratosphere.ResourceProperties
import Stratosphere.Value
data RdsDbInstanceProperty
=
RdsDbInstanceProperty {RdsDbInstanceProperty -> ()
haddock_workaround_ :: (),
RdsDbInstanceProperty -> Value Text
dbPassword :: (Value Prelude.Text),
RdsDbInstanceProperty -> Value Text
dbUser :: (Value Prelude.Text),
RdsDbInstanceProperty -> Value Text
rdsDbInstanceArn :: (Value Prelude.Text)}
deriving stock (RdsDbInstanceProperty -> RdsDbInstanceProperty -> Bool
(RdsDbInstanceProperty -> RdsDbInstanceProperty -> Bool)
-> (RdsDbInstanceProperty -> RdsDbInstanceProperty -> Bool)
-> Eq RdsDbInstanceProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: RdsDbInstanceProperty -> RdsDbInstanceProperty -> Bool
== :: RdsDbInstanceProperty -> RdsDbInstanceProperty -> Bool
$c/= :: RdsDbInstanceProperty -> RdsDbInstanceProperty -> Bool
/= :: RdsDbInstanceProperty -> RdsDbInstanceProperty -> Bool
Prelude.Eq, Int -> RdsDbInstanceProperty -> ShowS
[RdsDbInstanceProperty] -> ShowS
RdsDbInstanceProperty -> String
(Int -> RdsDbInstanceProperty -> ShowS)
-> (RdsDbInstanceProperty -> String)
-> ([RdsDbInstanceProperty] -> ShowS)
-> Show RdsDbInstanceProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> RdsDbInstanceProperty -> ShowS
showsPrec :: Int -> RdsDbInstanceProperty -> ShowS
$cshow :: RdsDbInstanceProperty -> String
show :: RdsDbInstanceProperty -> String
$cshowList :: [RdsDbInstanceProperty] -> ShowS
showList :: [RdsDbInstanceProperty] -> ShowS
Prelude.Show)
mkRdsDbInstanceProperty ::
Value Prelude.Text
-> Value Prelude.Text
-> Value Prelude.Text -> RdsDbInstanceProperty
mkRdsDbInstanceProperty :: Value Text -> Value Text -> Value Text -> RdsDbInstanceProperty
mkRdsDbInstanceProperty Value Text
dbPassword Value Text
dbUser Value Text
rdsDbInstanceArn
= RdsDbInstanceProperty
{haddock_workaround_ :: ()
haddock_workaround_ = (), dbPassword :: Value Text
dbPassword = Value Text
dbPassword,
dbUser :: Value Text
dbUser = Value Text
dbUser, rdsDbInstanceArn :: Value Text
rdsDbInstanceArn = Value Text
rdsDbInstanceArn}
instance ToResourceProperties RdsDbInstanceProperty where
toResourceProperties :: RdsDbInstanceProperty -> ResourceProperties
toResourceProperties RdsDbInstanceProperty {()
Value Text
haddock_workaround_ :: RdsDbInstanceProperty -> ()
dbPassword :: RdsDbInstanceProperty -> Value Text
dbUser :: RdsDbInstanceProperty -> Value Text
rdsDbInstanceArn :: RdsDbInstanceProperty -> Value Text
haddock_workaround_ :: ()
dbPassword :: Value Text
dbUser :: Value Text
rdsDbInstanceArn :: Value Text
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::OpsWorks::Stack.RdsDbInstance",
supportsTags :: Bool
supportsTags = Bool
Prelude.False,
properties :: Object
properties = [Key
"DbPassword" 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
dbPassword,
Key
"DbUser" 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
dbUser,
Key
"RdsDbInstanceArn" 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
rdsDbInstanceArn]}
instance JSON.ToJSON RdsDbInstanceProperty where
toJSON :: RdsDbInstanceProperty -> Value
toJSON RdsDbInstanceProperty {()
Value Text
haddock_workaround_ :: RdsDbInstanceProperty -> ()
dbPassword :: RdsDbInstanceProperty -> Value Text
dbUser :: RdsDbInstanceProperty -> Value Text
rdsDbInstanceArn :: RdsDbInstanceProperty -> Value Text
haddock_workaround_ :: ()
dbPassword :: Value Text
dbUser :: Value Text
rdsDbInstanceArn :: Value Text
..}
= [(Key, Value)] -> Value
JSON.object
[Key
"DbPassword" 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
dbPassword, Key
"DbUser" 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
dbUser,
Key
"RdsDbInstanceArn" 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
rdsDbInstanceArn]
instance Property "DbPassword" RdsDbInstanceProperty where
type PropertyType "DbPassword" RdsDbInstanceProperty = Value Prelude.Text
set :: PropertyType "DbPassword" RdsDbInstanceProperty
-> RdsDbInstanceProperty -> RdsDbInstanceProperty
set PropertyType "DbPassword" RdsDbInstanceProperty
newValue RdsDbInstanceProperty {()
Value Text
haddock_workaround_ :: RdsDbInstanceProperty -> ()
dbPassword :: RdsDbInstanceProperty -> Value Text
dbUser :: RdsDbInstanceProperty -> Value Text
rdsDbInstanceArn :: RdsDbInstanceProperty -> Value Text
haddock_workaround_ :: ()
dbPassword :: Value Text
dbUser :: Value Text
rdsDbInstanceArn :: Value Text
..}
= RdsDbInstanceProperty {dbPassword :: Value Text
dbPassword = PropertyType "DbPassword" RdsDbInstanceProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
dbUser :: Value Text
rdsDbInstanceArn :: Value Text
haddock_workaround_ :: ()
dbUser :: Value Text
rdsDbInstanceArn :: Value Text
..}
instance Property "DbUser" RdsDbInstanceProperty where
type PropertyType "DbUser" RdsDbInstanceProperty = Value Prelude.Text
set :: PropertyType "DbUser" RdsDbInstanceProperty
-> RdsDbInstanceProperty -> RdsDbInstanceProperty
set PropertyType "DbUser" RdsDbInstanceProperty
newValue RdsDbInstanceProperty {()
Value Text
haddock_workaround_ :: RdsDbInstanceProperty -> ()
dbPassword :: RdsDbInstanceProperty -> Value Text
dbUser :: RdsDbInstanceProperty -> Value Text
rdsDbInstanceArn :: RdsDbInstanceProperty -> Value Text
haddock_workaround_ :: ()
dbPassword :: Value Text
dbUser :: Value Text
rdsDbInstanceArn :: Value Text
..}
= RdsDbInstanceProperty {dbUser :: Value Text
dbUser = PropertyType "DbUser" RdsDbInstanceProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
dbPassword :: Value Text
rdsDbInstanceArn :: Value Text
haddock_workaround_ :: ()
dbPassword :: Value Text
rdsDbInstanceArn :: Value Text
..}
instance Property "RdsDbInstanceArn" RdsDbInstanceProperty where
type PropertyType "RdsDbInstanceArn" RdsDbInstanceProperty = Value Prelude.Text
set :: PropertyType "RdsDbInstanceArn" RdsDbInstanceProperty
-> RdsDbInstanceProperty -> RdsDbInstanceProperty
set PropertyType "RdsDbInstanceArn" RdsDbInstanceProperty
newValue RdsDbInstanceProperty {()
Value Text
haddock_workaround_ :: RdsDbInstanceProperty -> ()
dbPassword :: RdsDbInstanceProperty -> Value Text
dbUser :: RdsDbInstanceProperty -> Value Text
rdsDbInstanceArn :: RdsDbInstanceProperty -> Value Text
haddock_workaround_ :: ()
dbPassword :: Value Text
dbUser :: Value Text
rdsDbInstanceArn :: Value Text
..}
= RdsDbInstanceProperty {rdsDbInstanceArn :: Value Text
rdsDbInstanceArn = PropertyType "RdsDbInstanceArn" RdsDbInstanceProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
dbPassword :: Value Text
dbUser :: Value Text
haddock_workaround_ :: ()
dbPassword :: Value Text
dbUser :: Value Text
..}