module Stratosphere.CodeStarConnections.SyncConfiguration (
        SyncConfiguration(..), mkSyncConfiguration
    ) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import Stratosphere.ResourceProperties
import Stratosphere.Value
data SyncConfiguration
  = -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-codestarconnections-syncconfiguration.html>
    SyncConfiguration {SyncConfiguration -> ()
haddock_workaround_ :: (),
                       -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-codestarconnections-syncconfiguration.html#cfn-codestarconnections-syncconfiguration-branch>
                       SyncConfiguration -> Value Text
branch :: (Value Prelude.Text),
                       -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-codestarconnections-syncconfiguration.html#cfn-codestarconnections-syncconfiguration-configfile>
                       SyncConfiguration -> Value Text
configFile :: (Value Prelude.Text),
                       -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-codestarconnections-syncconfiguration.html#cfn-codestarconnections-syncconfiguration-publishdeploymentstatus>
                       SyncConfiguration -> Maybe (Value Text)
publishDeploymentStatus :: (Prelude.Maybe (Value Prelude.Text)),
                       -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-codestarconnections-syncconfiguration.html#cfn-codestarconnections-syncconfiguration-repositorylinkid>
                       SyncConfiguration -> Value Text
repositoryLinkId :: (Value Prelude.Text),
                       -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-codestarconnections-syncconfiguration.html#cfn-codestarconnections-syncconfiguration-resourcename>
                       SyncConfiguration -> Value Text
resourceName :: (Value Prelude.Text),
                       -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-codestarconnections-syncconfiguration.html#cfn-codestarconnections-syncconfiguration-rolearn>
                       SyncConfiguration -> Value Text
roleArn :: (Value Prelude.Text),
                       -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-codestarconnections-syncconfiguration.html#cfn-codestarconnections-syncconfiguration-synctype>
                       SyncConfiguration -> Value Text
syncType :: (Value Prelude.Text),
                       -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-codestarconnections-syncconfiguration.html#cfn-codestarconnections-syncconfiguration-triggerresourceupdateon>
                       SyncConfiguration -> Maybe (Value Text)
triggerResourceUpdateOn :: (Prelude.Maybe (Value Prelude.Text))}
  deriving stock (SyncConfiguration -> SyncConfiguration -> Bool
(SyncConfiguration -> SyncConfiguration -> Bool)
-> (SyncConfiguration -> SyncConfiguration -> Bool)
-> Eq SyncConfiguration
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: SyncConfiguration -> SyncConfiguration -> Bool
== :: SyncConfiguration -> SyncConfiguration -> Bool
$c/= :: SyncConfiguration -> SyncConfiguration -> Bool
/= :: SyncConfiguration -> SyncConfiguration -> Bool
Prelude.Eq, Int -> SyncConfiguration -> ShowS
[SyncConfiguration] -> ShowS
SyncConfiguration -> String
(Int -> SyncConfiguration -> ShowS)
-> (SyncConfiguration -> String)
-> ([SyncConfiguration] -> ShowS)
-> Show SyncConfiguration
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> SyncConfiguration -> ShowS
showsPrec :: Int -> SyncConfiguration -> ShowS
$cshow :: SyncConfiguration -> String
show :: SyncConfiguration -> String
$cshowList :: [SyncConfiguration] -> ShowS
showList :: [SyncConfiguration] -> ShowS
Prelude.Show)
mkSyncConfiguration ::
  Value Prelude.Text
  -> Value Prelude.Text
     -> Value Prelude.Text
        -> Value Prelude.Text
           -> Value Prelude.Text -> Value Prelude.Text -> SyncConfiguration
mkSyncConfiguration :: Value Text
-> Value Text
-> Value Text
-> Value Text
-> Value Text
-> Value Text
-> SyncConfiguration
mkSyncConfiguration
  Value Text
branch
  Value Text
configFile
  Value Text
repositoryLinkId
  Value Text
resourceName
  Value Text
roleArn
  Value Text
syncType
  = SyncConfiguration
      {haddock_workaround_ :: ()
haddock_workaround_ = (), branch :: Value Text
branch = Value Text
branch,
       configFile :: Value Text
configFile = Value Text
configFile, repositoryLinkId :: Value Text
repositoryLinkId = Value Text
repositoryLinkId,
       resourceName :: Value Text
resourceName = Value Text
resourceName, roleArn :: Value Text
roleArn = Value Text
roleArn,
       syncType :: Value Text
syncType = Value Text
syncType, publishDeploymentStatus :: Maybe (Value Text)
publishDeploymentStatus = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       triggerResourceUpdateOn :: Maybe (Value Text)
triggerResourceUpdateOn = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties SyncConfiguration where
  toResourceProperties :: SyncConfiguration -> ResourceProperties
toResourceProperties SyncConfiguration {Maybe (Value Text)
()
Value Text
haddock_workaround_ :: SyncConfiguration -> ()
branch :: SyncConfiguration -> Value Text
configFile :: SyncConfiguration -> Value Text
publishDeploymentStatus :: SyncConfiguration -> Maybe (Value Text)
repositoryLinkId :: SyncConfiguration -> Value Text
resourceName :: SyncConfiguration -> Value Text
roleArn :: SyncConfiguration -> Value Text
syncType :: SyncConfiguration -> Value Text
triggerResourceUpdateOn :: SyncConfiguration -> Maybe (Value Text)
haddock_workaround_ :: ()
branch :: Value Text
configFile :: Value Text
publishDeploymentStatus :: Maybe (Value Text)
repositoryLinkId :: Value Text
resourceName :: Value Text
roleArn :: Value Text
syncType :: Value Text
triggerResourceUpdateOn :: Maybe (Value Text)
..}
    = ResourceProperties
        {awsType :: Text
awsType = Text
"AWS::CodeStarConnections::SyncConfiguration",
         supportsTags :: Bool
supportsTags = Bool
Prelude.False,
         properties :: Object
properties = [Item Object] -> Object
forall l. IsList l => [Item l] -> l
Prelude.fromList
                        ([(Key, Value)] -> [(Key, Value)] -> [(Key, Value)]
forall a. Semigroup a => a -> a -> a
(Prelude.<>)
                           [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
"ConfigFile" 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
configFile,
                            Key
"RepositoryLinkId" 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
repositoryLinkId,
                            Key
"ResourceName" 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
resourceName, 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
"SyncType" 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
syncType]
                           ([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
                              [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..=) Key
"PublishDeploymentStatus"
                                 (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
publishDeploymentStatus,
                               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..=) Key
"TriggerResourceUpdateOn"
                                 (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
triggerResourceUpdateOn]))}
instance JSON.ToJSON SyncConfiguration where
  toJSON :: SyncConfiguration -> Value
toJSON SyncConfiguration {Maybe (Value Text)
()
Value Text
haddock_workaround_ :: SyncConfiguration -> ()
branch :: SyncConfiguration -> Value Text
configFile :: SyncConfiguration -> Value Text
publishDeploymentStatus :: SyncConfiguration -> Maybe (Value Text)
repositoryLinkId :: SyncConfiguration -> Value Text
resourceName :: SyncConfiguration -> Value Text
roleArn :: SyncConfiguration -> Value Text
syncType :: SyncConfiguration -> Value Text
triggerResourceUpdateOn :: SyncConfiguration -> Maybe (Value Text)
haddock_workaround_ :: ()
branch :: Value Text
configFile :: Value Text
publishDeploymentStatus :: Maybe (Value Text)
repositoryLinkId :: Value Text
resourceName :: Value Text
roleArn :: Value Text
syncType :: Value Text
triggerResourceUpdateOn :: Maybe (Value Text)
..}
    = [(Key, Value)] -> Value
JSON.object
        ([Item [(Key, Value)]] -> [(Key, Value)]
forall l. IsList l => [Item l] -> l
Prelude.fromList
           ([(Key, Value)] -> [(Key, Value)] -> [(Key, Value)]
forall a. Semigroup a => a -> a -> a
(Prelude.<>)
              [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
"ConfigFile" 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
configFile,
               Key
"RepositoryLinkId" 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
repositoryLinkId,
               Key
"ResourceName" 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
resourceName, 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
"SyncType" 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
syncType]
              ([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
                 [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..=) Key
"PublishDeploymentStatus"
                    (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
publishDeploymentStatus,
                  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..=) Key
"TriggerResourceUpdateOn"
                    (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
triggerResourceUpdateOn])))
instance Property "Branch" SyncConfiguration where
  type PropertyType "Branch" SyncConfiguration = Value Prelude.Text
  set :: PropertyType "Branch" SyncConfiguration
-> SyncConfiguration -> SyncConfiguration
set PropertyType "Branch" SyncConfiguration
newValue SyncConfiguration {Maybe (Value Text)
()
Value Text
haddock_workaround_ :: SyncConfiguration -> ()
branch :: SyncConfiguration -> Value Text
configFile :: SyncConfiguration -> Value Text
publishDeploymentStatus :: SyncConfiguration -> Maybe (Value Text)
repositoryLinkId :: SyncConfiguration -> Value Text
resourceName :: SyncConfiguration -> Value Text
roleArn :: SyncConfiguration -> Value Text
syncType :: SyncConfiguration -> Value Text
triggerResourceUpdateOn :: SyncConfiguration -> Maybe (Value Text)
haddock_workaround_ :: ()
branch :: Value Text
configFile :: Value Text
publishDeploymentStatus :: Maybe (Value Text)
repositoryLinkId :: Value Text
resourceName :: Value Text
roleArn :: Value Text
syncType :: Value Text
triggerResourceUpdateOn :: Maybe (Value Text)
..}
    = SyncConfiguration {branch :: Value Text
branch = PropertyType "Branch" SyncConfiguration
Value Text
newValue, Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ()
configFile :: Value Text
publishDeploymentStatus :: Maybe (Value Text)
repositoryLinkId :: Value Text
resourceName :: Value Text
roleArn :: Value Text
syncType :: Value Text
triggerResourceUpdateOn :: Maybe (Value Text)
haddock_workaround_ :: ()
configFile :: Value Text
publishDeploymentStatus :: Maybe (Value Text)
repositoryLinkId :: Value Text
resourceName :: Value Text
roleArn :: Value Text
syncType :: Value Text
triggerResourceUpdateOn :: Maybe (Value Text)
..}
instance Property "ConfigFile" SyncConfiguration where
  type PropertyType "ConfigFile" SyncConfiguration = Value Prelude.Text
  set :: PropertyType "ConfigFile" SyncConfiguration
-> SyncConfiguration -> SyncConfiguration
set PropertyType "ConfigFile" SyncConfiguration
newValue SyncConfiguration {Maybe (Value Text)
()
Value Text
haddock_workaround_ :: SyncConfiguration -> ()
branch :: SyncConfiguration -> Value Text
configFile :: SyncConfiguration -> Value Text
publishDeploymentStatus :: SyncConfiguration -> Maybe (Value Text)
repositoryLinkId :: SyncConfiguration -> Value Text
resourceName :: SyncConfiguration -> Value Text
roleArn :: SyncConfiguration -> Value Text
syncType :: SyncConfiguration -> Value Text
triggerResourceUpdateOn :: SyncConfiguration -> Maybe (Value Text)
haddock_workaround_ :: ()
branch :: Value Text
configFile :: Value Text
publishDeploymentStatus :: Maybe (Value Text)
repositoryLinkId :: Value Text
resourceName :: Value Text
roleArn :: Value Text
syncType :: Value Text
triggerResourceUpdateOn :: Maybe (Value Text)
..}
    = SyncConfiguration {configFile :: Value Text
configFile = PropertyType "ConfigFile" SyncConfiguration
Value Text
newValue, Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ()
branch :: Value Text
publishDeploymentStatus :: Maybe (Value Text)
repositoryLinkId :: Value Text
resourceName :: Value Text
roleArn :: Value Text
syncType :: Value Text
triggerResourceUpdateOn :: Maybe (Value Text)
haddock_workaround_ :: ()
branch :: Value Text
publishDeploymentStatus :: Maybe (Value Text)
repositoryLinkId :: Value Text
resourceName :: Value Text
roleArn :: Value Text
syncType :: Value Text
triggerResourceUpdateOn :: Maybe (Value Text)
..}
instance Property "PublishDeploymentStatus" SyncConfiguration where
  type PropertyType "PublishDeploymentStatus" SyncConfiguration = Value Prelude.Text
  set :: PropertyType "PublishDeploymentStatus" SyncConfiguration
-> SyncConfiguration -> SyncConfiguration
set PropertyType "PublishDeploymentStatus" SyncConfiguration
newValue SyncConfiguration {Maybe (Value Text)
()
Value Text
haddock_workaround_ :: SyncConfiguration -> ()
branch :: SyncConfiguration -> Value Text
configFile :: SyncConfiguration -> Value Text
publishDeploymentStatus :: SyncConfiguration -> Maybe (Value Text)
repositoryLinkId :: SyncConfiguration -> Value Text
resourceName :: SyncConfiguration -> Value Text
roleArn :: SyncConfiguration -> Value Text
syncType :: SyncConfiguration -> Value Text
triggerResourceUpdateOn :: SyncConfiguration -> Maybe (Value Text)
haddock_workaround_ :: ()
branch :: Value Text
configFile :: Value Text
publishDeploymentStatus :: Maybe (Value Text)
repositoryLinkId :: Value Text
resourceName :: Value Text
roleArn :: Value Text
syncType :: Value Text
triggerResourceUpdateOn :: Maybe (Value Text)
..}
    = SyncConfiguration
        {publishDeploymentStatus :: Maybe (Value Text)
publishDeploymentStatus = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "PublishDeploymentStatus" SyncConfiguration
Value Text
newValue, Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ()
branch :: Value Text
configFile :: Value Text
repositoryLinkId :: Value Text
resourceName :: Value Text
roleArn :: Value Text
syncType :: Value Text
triggerResourceUpdateOn :: Maybe (Value Text)
haddock_workaround_ :: ()
branch :: Value Text
configFile :: Value Text
repositoryLinkId :: Value Text
resourceName :: Value Text
roleArn :: Value Text
syncType :: Value Text
triggerResourceUpdateOn :: Maybe (Value Text)
..}
instance Property "RepositoryLinkId" SyncConfiguration where
  type PropertyType "RepositoryLinkId" SyncConfiguration = Value Prelude.Text
  set :: PropertyType "RepositoryLinkId" SyncConfiguration
-> SyncConfiguration -> SyncConfiguration
set PropertyType "RepositoryLinkId" SyncConfiguration
newValue SyncConfiguration {Maybe (Value Text)
()
Value Text
haddock_workaround_ :: SyncConfiguration -> ()
branch :: SyncConfiguration -> Value Text
configFile :: SyncConfiguration -> Value Text
publishDeploymentStatus :: SyncConfiguration -> Maybe (Value Text)
repositoryLinkId :: SyncConfiguration -> Value Text
resourceName :: SyncConfiguration -> Value Text
roleArn :: SyncConfiguration -> Value Text
syncType :: SyncConfiguration -> Value Text
triggerResourceUpdateOn :: SyncConfiguration -> Maybe (Value Text)
haddock_workaround_ :: ()
branch :: Value Text
configFile :: Value Text
publishDeploymentStatus :: Maybe (Value Text)
repositoryLinkId :: Value Text
resourceName :: Value Text
roleArn :: Value Text
syncType :: Value Text
triggerResourceUpdateOn :: Maybe (Value Text)
..}
    = SyncConfiguration {repositoryLinkId :: Value Text
repositoryLinkId = PropertyType "RepositoryLinkId" SyncConfiguration
Value Text
newValue, Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ()
branch :: Value Text
configFile :: Value Text
publishDeploymentStatus :: Maybe (Value Text)
resourceName :: Value Text
roleArn :: Value Text
syncType :: Value Text
triggerResourceUpdateOn :: Maybe (Value Text)
haddock_workaround_ :: ()
branch :: Value Text
configFile :: Value Text
publishDeploymentStatus :: Maybe (Value Text)
resourceName :: Value Text
roleArn :: Value Text
syncType :: Value Text
triggerResourceUpdateOn :: Maybe (Value Text)
..}
instance Property "ResourceName" SyncConfiguration where
  type PropertyType "ResourceName" SyncConfiguration = Value Prelude.Text
  set :: PropertyType "ResourceName" SyncConfiguration
-> SyncConfiguration -> SyncConfiguration
set PropertyType "ResourceName" SyncConfiguration
newValue SyncConfiguration {Maybe (Value Text)
()
Value Text
haddock_workaround_ :: SyncConfiguration -> ()
branch :: SyncConfiguration -> Value Text
configFile :: SyncConfiguration -> Value Text
publishDeploymentStatus :: SyncConfiguration -> Maybe (Value Text)
repositoryLinkId :: SyncConfiguration -> Value Text
resourceName :: SyncConfiguration -> Value Text
roleArn :: SyncConfiguration -> Value Text
syncType :: SyncConfiguration -> Value Text
triggerResourceUpdateOn :: SyncConfiguration -> Maybe (Value Text)
haddock_workaround_ :: ()
branch :: Value Text
configFile :: Value Text
publishDeploymentStatus :: Maybe (Value Text)
repositoryLinkId :: Value Text
resourceName :: Value Text
roleArn :: Value Text
syncType :: Value Text
triggerResourceUpdateOn :: Maybe (Value Text)
..}
    = SyncConfiguration {resourceName :: Value Text
resourceName = PropertyType "ResourceName" SyncConfiguration
Value Text
newValue, Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ()
branch :: Value Text
configFile :: Value Text
publishDeploymentStatus :: Maybe (Value Text)
repositoryLinkId :: Value Text
roleArn :: Value Text
syncType :: Value Text
triggerResourceUpdateOn :: Maybe (Value Text)
haddock_workaround_ :: ()
branch :: Value Text
configFile :: Value Text
publishDeploymentStatus :: Maybe (Value Text)
repositoryLinkId :: Value Text
roleArn :: Value Text
syncType :: Value Text
triggerResourceUpdateOn :: Maybe (Value Text)
..}
instance Property "RoleArn" SyncConfiguration where
  type PropertyType "RoleArn" SyncConfiguration = Value Prelude.Text
  set :: PropertyType "RoleArn" SyncConfiguration
-> SyncConfiguration -> SyncConfiguration
set PropertyType "RoleArn" SyncConfiguration
newValue SyncConfiguration {Maybe (Value Text)
()
Value Text
haddock_workaround_ :: SyncConfiguration -> ()
branch :: SyncConfiguration -> Value Text
configFile :: SyncConfiguration -> Value Text
publishDeploymentStatus :: SyncConfiguration -> Maybe (Value Text)
repositoryLinkId :: SyncConfiguration -> Value Text
resourceName :: SyncConfiguration -> Value Text
roleArn :: SyncConfiguration -> Value Text
syncType :: SyncConfiguration -> Value Text
triggerResourceUpdateOn :: SyncConfiguration -> Maybe (Value Text)
haddock_workaround_ :: ()
branch :: Value Text
configFile :: Value Text
publishDeploymentStatus :: Maybe (Value Text)
repositoryLinkId :: Value Text
resourceName :: Value Text
roleArn :: Value Text
syncType :: Value Text
triggerResourceUpdateOn :: Maybe (Value Text)
..}
    = SyncConfiguration {roleArn :: Value Text
roleArn = PropertyType "RoleArn" SyncConfiguration
Value Text
newValue, Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ()
branch :: Value Text
configFile :: Value Text
publishDeploymentStatus :: Maybe (Value Text)
repositoryLinkId :: Value Text
resourceName :: Value Text
syncType :: Value Text
triggerResourceUpdateOn :: Maybe (Value Text)
haddock_workaround_ :: ()
branch :: Value Text
configFile :: Value Text
publishDeploymentStatus :: Maybe (Value Text)
repositoryLinkId :: Value Text
resourceName :: Value Text
syncType :: Value Text
triggerResourceUpdateOn :: Maybe (Value Text)
..}
instance Property "SyncType" SyncConfiguration where
  type PropertyType "SyncType" SyncConfiguration = Value Prelude.Text
  set :: PropertyType "SyncType" SyncConfiguration
-> SyncConfiguration -> SyncConfiguration
set PropertyType "SyncType" SyncConfiguration
newValue SyncConfiguration {Maybe (Value Text)
()
Value Text
haddock_workaround_ :: SyncConfiguration -> ()
branch :: SyncConfiguration -> Value Text
configFile :: SyncConfiguration -> Value Text
publishDeploymentStatus :: SyncConfiguration -> Maybe (Value Text)
repositoryLinkId :: SyncConfiguration -> Value Text
resourceName :: SyncConfiguration -> Value Text
roleArn :: SyncConfiguration -> Value Text
syncType :: SyncConfiguration -> Value Text
triggerResourceUpdateOn :: SyncConfiguration -> Maybe (Value Text)
haddock_workaround_ :: ()
branch :: Value Text
configFile :: Value Text
publishDeploymentStatus :: Maybe (Value Text)
repositoryLinkId :: Value Text
resourceName :: Value Text
roleArn :: Value Text
syncType :: Value Text
triggerResourceUpdateOn :: Maybe (Value Text)
..}
    = SyncConfiguration {syncType :: Value Text
syncType = PropertyType "SyncType" SyncConfiguration
Value Text
newValue, Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ()
branch :: Value Text
configFile :: Value Text
publishDeploymentStatus :: Maybe (Value Text)
repositoryLinkId :: Value Text
resourceName :: Value Text
roleArn :: Value Text
triggerResourceUpdateOn :: Maybe (Value Text)
haddock_workaround_ :: ()
branch :: Value Text
configFile :: Value Text
publishDeploymentStatus :: Maybe (Value Text)
repositoryLinkId :: Value Text
resourceName :: Value Text
roleArn :: Value Text
triggerResourceUpdateOn :: Maybe (Value Text)
..}
instance Property "TriggerResourceUpdateOn" SyncConfiguration where
  type PropertyType "TriggerResourceUpdateOn" SyncConfiguration = Value Prelude.Text
  set :: PropertyType "TriggerResourceUpdateOn" SyncConfiguration
-> SyncConfiguration -> SyncConfiguration
set PropertyType "TriggerResourceUpdateOn" SyncConfiguration
newValue SyncConfiguration {Maybe (Value Text)
()
Value Text
haddock_workaround_ :: SyncConfiguration -> ()
branch :: SyncConfiguration -> Value Text
configFile :: SyncConfiguration -> Value Text
publishDeploymentStatus :: SyncConfiguration -> Maybe (Value Text)
repositoryLinkId :: SyncConfiguration -> Value Text
resourceName :: SyncConfiguration -> Value Text
roleArn :: SyncConfiguration -> Value Text
syncType :: SyncConfiguration -> Value Text
triggerResourceUpdateOn :: SyncConfiguration -> Maybe (Value Text)
haddock_workaround_ :: ()
branch :: Value Text
configFile :: Value Text
publishDeploymentStatus :: Maybe (Value Text)
repositoryLinkId :: Value Text
resourceName :: Value Text
roleArn :: Value Text
syncType :: Value Text
triggerResourceUpdateOn :: Maybe (Value Text)
..}
    = SyncConfiguration
        {triggerResourceUpdateOn :: Maybe (Value Text)
triggerResourceUpdateOn = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "TriggerResourceUpdateOn" SyncConfiguration
Value Text
newValue, Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ()
branch :: Value Text
configFile :: Value Text
publishDeploymentStatus :: Maybe (Value Text)
repositoryLinkId :: Value Text
resourceName :: Value Text
roleArn :: Value Text
syncType :: Value Text
haddock_workaround_ :: ()
branch :: Value Text
configFile :: Value Text
publishDeploymentStatus :: Maybe (Value Text)
repositoryLinkId :: Value Text
resourceName :: Value Text
roleArn :: Value Text
syncType :: Value Text
..}