module Stratosphere.ServiceCatalog.CloudFormationProduct.CodeStarParametersProperty (
        CodeStarParametersProperty(..), mkCodeStarParametersProperty
    ) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import Stratosphere.ResourceProperties
import Stratosphere.Value
data CodeStarParametersProperty
  = -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-servicecatalog-cloudformationproduct-codestarparameters.html>
    CodeStarParametersProperty {CodeStarParametersProperty -> ()
haddock_workaround_ :: (),
                                -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-servicecatalog-cloudformationproduct-codestarparameters.html#cfn-servicecatalog-cloudformationproduct-codestarparameters-artifactpath>
                                CodeStarParametersProperty -> Value Text
artifactPath :: (Value Prelude.Text),
                                -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-servicecatalog-cloudformationproduct-codestarparameters.html#cfn-servicecatalog-cloudformationproduct-codestarparameters-branch>
                                CodeStarParametersProperty -> Value Text
branch :: (Value Prelude.Text),
                                -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-servicecatalog-cloudformationproduct-codestarparameters.html#cfn-servicecatalog-cloudformationproduct-codestarparameters-connectionarn>
                                CodeStarParametersProperty -> Value Text
connectionArn :: (Value Prelude.Text),
                                -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-servicecatalog-cloudformationproduct-codestarparameters.html#cfn-servicecatalog-cloudformationproduct-codestarparameters-repository>
                                CodeStarParametersProperty -> Value Text
repository :: (Value Prelude.Text)}
  deriving stock (CodeStarParametersProperty -> CodeStarParametersProperty -> Bool
(CodeStarParametersProperty -> CodeStarParametersProperty -> Bool)
-> (CodeStarParametersProperty
    -> CodeStarParametersProperty -> Bool)
-> Eq CodeStarParametersProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: CodeStarParametersProperty -> CodeStarParametersProperty -> Bool
== :: CodeStarParametersProperty -> CodeStarParametersProperty -> Bool
$c/= :: CodeStarParametersProperty -> CodeStarParametersProperty -> Bool
/= :: CodeStarParametersProperty -> CodeStarParametersProperty -> Bool
Prelude.Eq, Int -> CodeStarParametersProperty -> ShowS
[CodeStarParametersProperty] -> ShowS
CodeStarParametersProperty -> String
(Int -> CodeStarParametersProperty -> ShowS)
-> (CodeStarParametersProperty -> String)
-> ([CodeStarParametersProperty] -> ShowS)
-> Show CodeStarParametersProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> CodeStarParametersProperty -> ShowS
showsPrec :: Int -> CodeStarParametersProperty -> ShowS
$cshow :: CodeStarParametersProperty -> String
show :: CodeStarParametersProperty -> String
$cshowList :: [CodeStarParametersProperty] -> ShowS
showList :: [CodeStarParametersProperty] -> ShowS
Prelude.Show)
mkCodeStarParametersProperty ::
  Value Prelude.Text
  -> Value Prelude.Text
     -> Value Prelude.Text
        -> Value Prelude.Text -> CodeStarParametersProperty
mkCodeStarParametersProperty :: Value Text
-> Value Text
-> Value Text
-> Value Text
-> CodeStarParametersProperty
mkCodeStarParametersProperty
  Value Text
artifactPath
  Value Text
branch
  Value Text
connectionArn
  Value Text
repository
  = CodeStarParametersProperty
      {haddock_workaround_ :: ()
haddock_workaround_ = (), artifactPath :: Value Text
artifactPath = Value Text
artifactPath,
       branch :: Value Text
branch = Value Text
branch, connectionArn :: Value Text
connectionArn = Value Text
connectionArn,
       repository :: Value Text
repository = Value Text
repository}
instance ToResourceProperties CodeStarParametersProperty where
  toResourceProperties :: CodeStarParametersProperty -> ResourceProperties
toResourceProperties CodeStarParametersProperty {()
Value Text
haddock_workaround_ :: CodeStarParametersProperty -> ()
artifactPath :: CodeStarParametersProperty -> Value Text
branch :: CodeStarParametersProperty -> Value Text
connectionArn :: CodeStarParametersProperty -> Value Text
repository :: CodeStarParametersProperty -> Value Text
haddock_workaround_ :: ()
artifactPath :: Value Text
branch :: Value Text
connectionArn :: Value Text
repository :: Value Text
..}
    = ResourceProperties
        {awsType :: Text
awsType = Text
"AWS::ServiceCatalog::CloudFormationProduct.CodeStarParameters",
         supportsTags :: Bool
supportsTags = Bool
Prelude.False,
         properties :: Object
properties = [Key
"ArtifactPath" 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
artifactPath,
                       Key
"Branch" 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
branch, Key
"ConnectionArn" 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
connectionArn,
                       Key
"Repository" 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
repository]}
instance JSON.ToJSON CodeStarParametersProperty where
  toJSON :: CodeStarParametersProperty -> Value
toJSON CodeStarParametersProperty {()
Value Text
haddock_workaround_ :: CodeStarParametersProperty -> ()
artifactPath :: CodeStarParametersProperty -> Value Text
branch :: CodeStarParametersProperty -> Value Text
connectionArn :: CodeStarParametersProperty -> Value Text
repository :: CodeStarParametersProperty -> Value Text
haddock_workaround_ :: ()
artifactPath :: Value Text
branch :: Value Text
connectionArn :: Value Text
repository :: Value Text
..}
    = [(Key, Value)] -> Value
JSON.object
        [Key
"ArtifactPath" 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
artifactPath, Key
"Branch" 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
branch,
         Key
"ConnectionArn" 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
connectionArn,
         Key
"Repository" 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
repository]
instance Property "ArtifactPath" CodeStarParametersProperty where
  type PropertyType "ArtifactPath" CodeStarParametersProperty = Value Prelude.Text
  set :: PropertyType "ArtifactPath" CodeStarParametersProperty
-> CodeStarParametersProperty -> CodeStarParametersProperty
set PropertyType "ArtifactPath" CodeStarParametersProperty
newValue CodeStarParametersProperty {()
Value Text
haddock_workaround_ :: CodeStarParametersProperty -> ()
artifactPath :: CodeStarParametersProperty -> Value Text
branch :: CodeStarParametersProperty -> Value Text
connectionArn :: CodeStarParametersProperty -> Value Text
repository :: CodeStarParametersProperty -> Value Text
haddock_workaround_ :: ()
artifactPath :: Value Text
branch :: Value Text
connectionArn :: Value Text
repository :: Value Text
..}
    = CodeStarParametersProperty {artifactPath :: Value Text
artifactPath = PropertyType "ArtifactPath" CodeStarParametersProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
branch :: Value Text
connectionArn :: Value Text
repository :: Value Text
haddock_workaround_ :: ()
branch :: Value Text
connectionArn :: Value Text
repository :: Value Text
..}
instance Property "Branch" CodeStarParametersProperty where
  type PropertyType "Branch" CodeStarParametersProperty = Value Prelude.Text
  set :: PropertyType "Branch" CodeStarParametersProperty
-> CodeStarParametersProperty -> CodeStarParametersProperty
set PropertyType "Branch" CodeStarParametersProperty
newValue CodeStarParametersProperty {()
Value Text
haddock_workaround_ :: CodeStarParametersProperty -> ()
artifactPath :: CodeStarParametersProperty -> Value Text
branch :: CodeStarParametersProperty -> Value Text
connectionArn :: CodeStarParametersProperty -> Value Text
repository :: CodeStarParametersProperty -> Value Text
haddock_workaround_ :: ()
artifactPath :: Value Text
branch :: Value Text
connectionArn :: Value Text
repository :: Value Text
..}
    = CodeStarParametersProperty {branch :: Value Text
branch = PropertyType "Branch" CodeStarParametersProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
artifactPath :: Value Text
connectionArn :: Value Text
repository :: Value Text
haddock_workaround_ :: ()
artifactPath :: Value Text
connectionArn :: Value Text
repository :: Value Text
..}
instance Property "ConnectionArn" CodeStarParametersProperty where
  type PropertyType "ConnectionArn" CodeStarParametersProperty = Value Prelude.Text
  set :: PropertyType "ConnectionArn" CodeStarParametersProperty
-> CodeStarParametersProperty -> CodeStarParametersProperty
set PropertyType "ConnectionArn" CodeStarParametersProperty
newValue CodeStarParametersProperty {()
Value Text
haddock_workaround_ :: CodeStarParametersProperty -> ()
artifactPath :: CodeStarParametersProperty -> Value Text
branch :: CodeStarParametersProperty -> Value Text
connectionArn :: CodeStarParametersProperty -> Value Text
repository :: CodeStarParametersProperty -> Value Text
haddock_workaround_ :: ()
artifactPath :: Value Text
branch :: Value Text
connectionArn :: Value Text
repository :: Value Text
..}
    = CodeStarParametersProperty {connectionArn :: Value Text
connectionArn = PropertyType "ConnectionArn" CodeStarParametersProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
artifactPath :: Value Text
branch :: Value Text
repository :: Value Text
haddock_workaround_ :: ()
artifactPath :: Value Text
branch :: Value Text
repository :: Value Text
..}
instance Property "Repository" CodeStarParametersProperty where
  type PropertyType "Repository" CodeStarParametersProperty = Value Prelude.Text
  set :: PropertyType "Repository" CodeStarParametersProperty
-> CodeStarParametersProperty -> CodeStarParametersProperty
set PropertyType "Repository" CodeStarParametersProperty
newValue CodeStarParametersProperty {()
Value Text
haddock_workaround_ :: CodeStarParametersProperty -> ()
artifactPath :: CodeStarParametersProperty -> Value Text
branch :: CodeStarParametersProperty -> Value Text
connectionArn :: CodeStarParametersProperty -> Value Text
repository :: CodeStarParametersProperty -> Value Text
haddock_workaround_ :: ()
artifactPath :: Value Text
branch :: Value Text
connectionArn :: Value Text
repository :: Value Text
..}
    = CodeStarParametersProperty {repository :: Value Text
repository = PropertyType "Repository" CodeStarParametersProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
artifactPath :: Value Text
branch :: Value Text
connectionArn :: Value Text
haddock_workaround_ :: ()
artifactPath :: Value Text
branch :: Value Text
connectionArn :: Value Text
..}