module Stratosphere.CodeDeploy.DeploymentGroup.GitHubLocationProperty (
GitHubLocationProperty(..), mkGitHubLocationProperty
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import Stratosphere.ResourceProperties
import Stratosphere.Value
data GitHubLocationProperty
=
GitHubLocationProperty {GitHubLocationProperty -> ()
haddock_workaround_ :: (),
GitHubLocationProperty -> Value Text
commitId :: (Value Prelude.Text),
GitHubLocationProperty -> Value Text
repository :: (Value Prelude.Text)}
deriving stock (GitHubLocationProperty -> GitHubLocationProperty -> Bool
(GitHubLocationProperty -> GitHubLocationProperty -> Bool)
-> (GitHubLocationProperty -> GitHubLocationProperty -> Bool)
-> Eq GitHubLocationProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: GitHubLocationProperty -> GitHubLocationProperty -> Bool
== :: GitHubLocationProperty -> GitHubLocationProperty -> Bool
$c/= :: GitHubLocationProperty -> GitHubLocationProperty -> Bool
/= :: GitHubLocationProperty -> GitHubLocationProperty -> Bool
Prelude.Eq, Int -> GitHubLocationProperty -> ShowS
[GitHubLocationProperty] -> ShowS
GitHubLocationProperty -> String
(Int -> GitHubLocationProperty -> ShowS)
-> (GitHubLocationProperty -> String)
-> ([GitHubLocationProperty] -> ShowS)
-> Show GitHubLocationProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> GitHubLocationProperty -> ShowS
showsPrec :: Int -> GitHubLocationProperty -> ShowS
$cshow :: GitHubLocationProperty -> String
show :: GitHubLocationProperty -> String
$cshowList :: [GitHubLocationProperty] -> ShowS
showList :: [GitHubLocationProperty] -> ShowS
Prelude.Show)
mkGitHubLocationProperty ::
Value Prelude.Text -> Value Prelude.Text -> GitHubLocationProperty
mkGitHubLocationProperty :: Value Text -> Value Text -> GitHubLocationProperty
mkGitHubLocationProperty Value Text
commitId Value Text
repository
= GitHubLocationProperty
{haddock_workaround_ :: ()
haddock_workaround_ = (), commitId :: Value Text
commitId = Value Text
commitId,
repository :: Value Text
repository = Value Text
repository}
instance ToResourceProperties GitHubLocationProperty where
toResourceProperties :: GitHubLocationProperty -> ResourceProperties
toResourceProperties GitHubLocationProperty {()
Value Text
haddock_workaround_ :: GitHubLocationProperty -> ()
commitId :: GitHubLocationProperty -> Value Text
repository :: GitHubLocationProperty -> Value Text
haddock_workaround_ :: ()
commitId :: Value Text
repository :: Value Text
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::CodeDeploy::DeploymentGroup.GitHubLocation",
supportsTags :: Bool
supportsTags = Bool
Prelude.False,
properties :: Object
properties = [Key
"CommitId" 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
commitId,
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 GitHubLocationProperty where
toJSON :: GitHubLocationProperty -> Value
toJSON GitHubLocationProperty {()
Value Text
haddock_workaround_ :: GitHubLocationProperty -> ()
commitId :: GitHubLocationProperty -> Value Text
repository :: GitHubLocationProperty -> Value Text
haddock_workaround_ :: ()
commitId :: Value Text
repository :: Value Text
..}
= [(Key, Value)] -> Value
JSON.object
[Key
"CommitId" 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
commitId, 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 "CommitId" GitHubLocationProperty where
type PropertyType "CommitId" GitHubLocationProperty = Value Prelude.Text
set :: PropertyType "CommitId" GitHubLocationProperty
-> GitHubLocationProperty -> GitHubLocationProperty
set PropertyType "CommitId" GitHubLocationProperty
newValue GitHubLocationProperty {()
Value Text
haddock_workaround_ :: GitHubLocationProperty -> ()
commitId :: GitHubLocationProperty -> Value Text
repository :: GitHubLocationProperty -> Value Text
haddock_workaround_ :: ()
commitId :: Value Text
repository :: Value Text
..}
= GitHubLocationProperty {commitId :: Value Text
commitId = PropertyType "CommitId" GitHubLocationProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
repository :: Value Text
haddock_workaround_ :: ()
repository :: Value Text
..}
instance Property "Repository" GitHubLocationProperty where
type PropertyType "Repository" GitHubLocationProperty = Value Prelude.Text
set :: PropertyType "Repository" GitHubLocationProperty
-> GitHubLocationProperty -> GitHubLocationProperty
set PropertyType "Repository" GitHubLocationProperty
newValue GitHubLocationProperty {()
Value Text
haddock_workaround_ :: GitHubLocationProperty -> ()
commitId :: GitHubLocationProperty -> Value Text
repository :: GitHubLocationProperty -> Value Text
haddock_workaround_ :: ()
commitId :: Value Text
repository :: Value Text
..}
= GitHubLocationProperty {repository :: Value Text
repository = PropertyType "Repository" GitHubLocationProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
commitId :: Value Text
haddock_workaround_ :: ()
commitId :: Value Text
..}