module Stratosphere.SecretsManager.SecretTargetAttachment (
        SecretTargetAttachment(..), mkSecretTargetAttachment
    ) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import Stratosphere.ResourceProperties
import Stratosphere.Value
data SecretTargetAttachment
  = -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-secretsmanager-secrettargetattachment.html>
    SecretTargetAttachment {SecretTargetAttachment -> ()
haddock_workaround_ :: (),
                            -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-secretsmanager-secrettargetattachment.html#cfn-secretsmanager-secrettargetattachment-secretid>
                            SecretTargetAttachment -> Value Text
secretId :: (Value Prelude.Text),
                            -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-secretsmanager-secrettargetattachment.html#cfn-secretsmanager-secrettargetattachment-targetid>
                            SecretTargetAttachment -> Value Text
targetId :: (Value Prelude.Text),
                            -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-secretsmanager-secrettargetattachment.html#cfn-secretsmanager-secrettargetattachment-targettype>
                            SecretTargetAttachment -> Value Text
targetType :: (Value Prelude.Text)}
  deriving stock (SecretTargetAttachment -> SecretTargetAttachment -> Bool
(SecretTargetAttachment -> SecretTargetAttachment -> Bool)
-> (SecretTargetAttachment -> SecretTargetAttachment -> Bool)
-> Eq SecretTargetAttachment
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: SecretTargetAttachment -> SecretTargetAttachment -> Bool
== :: SecretTargetAttachment -> SecretTargetAttachment -> Bool
$c/= :: SecretTargetAttachment -> SecretTargetAttachment -> Bool
/= :: SecretTargetAttachment -> SecretTargetAttachment -> Bool
Prelude.Eq, Int -> SecretTargetAttachment -> ShowS
[SecretTargetAttachment] -> ShowS
SecretTargetAttachment -> String
(Int -> SecretTargetAttachment -> ShowS)
-> (SecretTargetAttachment -> String)
-> ([SecretTargetAttachment] -> ShowS)
-> Show SecretTargetAttachment
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> SecretTargetAttachment -> ShowS
showsPrec :: Int -> SecretTargetAttachment -> ShowS
$cshow :: SecretTargetAttachment -> String
show :: SecretTargetAttachment -> String
$cshowList :: [SecretTargetAttachment] -> ShowS
showList :: [SecretTargetAttachment] -> ShowS
Prelude.Show)
mkSecretTargetAttachment ::
  Value Prelude.Text
  -> Value Prelude.Text
     -> Value Prelude.Text -> SecretTargetAttachment
mkSecretTargetAttachment :: Value Text -> Value Text -> Value Text -> SecretTargetAttachment
mkSecretTargetAttachment Value Text
secretId Value Text
targetId Value Text
targetType
  = SecretTargetAttachment
      {haddock_workaround_ :: ()
haddock_workaround_ = (), secretId :: Value Text
secretId = Value Text
secretId,
       targetId :: Value Text
targetId = Value Text
targetId, targetType :: Value Text
targetType = Value Text
targetType}
instance ToResourceProperties SecretTargetAttachment where
  toResourceProperties :: SecretTargetAttachment -> ResourceProperties
toResourceProperties SecretTargetAttachment {()
Value Text
haddock_workaround_ :: SecretTargetAttachment -> ()
secretId :: SecretTargetAttachment -> Value Text
targetId :: SecretTargetAttachment -> Value Text
targetType :: SecretTargetAttachment -> Value Text
haddock_workaround_ :: ()
secretId :: Value Text
targetId :: Value Text
targetType :: Value Text
..}
    = ResourceProperties
        {awsType :: Text
awsType = Text
"AWS::SecretsManager::SecretTargetAttachment",
         supportsTags :: Bool
supportsTags = Bool
Prelude.False,
         properties :: Object
properties = [Key
"SecretId" 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
secretId,
                       Key
"TargetId" 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
targetId, Key
"TargetType" 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
targetType]}
instance JSON.ToJSON SecretTargetAttachment where
  toJSON :: SecretTargetAttachment -> Value
toJSON SecretTargetAttachment {()
Value Text
haddock_workaround_ :: SecretTargetAttachment -> ()
secretId :: SecretTargetAttachment -> Value Text
targetId :: SecretTargetAttachment -> Value Text
targetType :: SecretTargetAttachment -> Value Text
haddock_workaround_ :: ()
secretId :: Value Text
targetId :: Value Text
targetType :: Value Text
..}
    = [(Key, Value)] -> Value
JSON.object
        [Key
"SecretId" 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
secretId, Key
"TargetId" 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
targetId,
         Key
"TargetType" 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
targetType]
instance Property "SecretId" SecretTargetAttachment where
  type PropertyType "SecretId" SecretTargetAttachment = Value Prelude.Text
  set :: PropertyType "SecretId" SecretTargetAttachment
-> SecretTargetAttachment -> SecretTargetAttachment
set PropertyType "SecretId" SecretTargetAttachment
newValue SecretTargetAttachment {()
Value Text
haddock_workaround_ :: SecretTargetAttachment -> ()
secretId :: SecretTargetAttachment -> Value Text
targetId :: SecretTargetAttachment -> Value Text
targetType :: SecretTargetAttachment -> Value Text
haddock_workaround_ :: ()
secretId :: Value Text
targetId :: Value Text
targetType :: Value Text
..}
    = SecretTargetAttachment {secretId :: Value Text
secretId = PropertyType "SecretId" SecretTargetAttachment
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
targetId :: Value Text
targetType :: Value Text
haddock_workaround_ :: ()
targetId :: Value Text
targetType :: Value Text
..}
instance Property "TargetId" SecretTargetAttachment where
  type PropertyType "TargetId" SecretTargetAttachment = Value Prelude.Text
  set :: PropertyType "TargetId" SecretTargetAttachment
-> SecretTargetAttachment -> SecretTargetAttachment
set PropertyType "TargetId" SecretTargetAttachment
newValue SecretTargetAttachment {()
Value Text
haddock_workaround_ :: SecretTargetAttachment -> ()
secretId :: SecretTargetAttachment -> Value Text
targetId :: SecretTargetAttachment -> Value Text
targetType :: SecretTargetAttachment -> Value Text
haddock_workaround_ :: ()
secretId :: Value Text
targetId :: Value Text
targetType :: Value Text
..}
    = SecretTargetAttachment {targetId :: Value Text
targetId = PropertyType "TargetId" SecretTargetAttachment
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
secretId :: Value Text
targetType :: Value Text
haddock_workaround_ :: ()
secretId :: Value Text
targetType :: Value Text
..}
instance Property "TargetType" SecretTargetAttachment where
  type PropertyType "TargetType" SecretTargetAttachment = Value Prelude.Text
  set :: PropertyType "TargetType" SecretTargetAttachment
-> SecretTargetAttachment -> SecretTargetAttachment
set PropertyType "TargetType" SecretTargetAttachment
newValue SecretTargetAttachment {()
Value Text
haddock_workaround_ :: SecretTargetAttachment -> ()
secretId :: SecretTargetAttachment -> Value Text
targetId :: SecretTargetAttachment -> Value Text
targetType :: SecretTargetAttachment -> Value Text
haddock_workaround_ :: ()
secretId :: Value Text
targetId :: Value Text
targetType :: Value Text
..}
    = SecretTargetAttachment {targetType :: Value Text
targetType = PropertyType "TargetType" SecretTargetAttachment
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
secretId :: Value Text
targetId :: Value Text
haddock_workaround_ :: ()
secretId :: Value Text
targetId :: Value Text
..}