module Stratosphere.Amplify.App (
        module Exports, App(..), mkApp
    ) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.Amplify.App.AutoBranchCreationConfigProperty as Exports
import {-# SOURCE #-} Stratosphere.Amplify.App.BasicAuthConfigProperty as Exports
import {-# SOURCE #-} Stratosphere.Amplify.App.CacheConfigProperty as Exports
import {-# SOURCE #-} Stratosphere.Amplify.App.CustomRuleProperty as Exports
import {-# SOURCE #-} Stratosphere.Amplify.App.EnvironmentVariableProperty as Exports
import {-# SOURCE #-} Stratosphere.Amplify.App.JobConfigProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Tag
import Stratosphere.Value
data App
  = -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-amplify-app.html>
    App {App -> ()
haddock_workaround_ :: (),
         -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-amplify-app.html#cfn-amplify-app-accesstoken>
         App -> Maybe (Value Text)
accessToken :: (Prelude.Maybe (Value Prelude.Text)),
         -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-amplify-app.html#cfn-amplify-app-autobranchcreationconfig>
         App -> Maybe AutoBranchCreationConfigProperty
autoBranchCreationConfig :: (Prelude.Maybe AutoBranchCreationConfigProperty),
         -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-amplify-app.html#cfn-amplify-app-basicauthconfig>
         App -> Maybe BasicAuthConfigProperty
basicAuthConfig :: (Prelude.Maybe BasicAuthConfigProperty),
         -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-amplify-app.html#cfn-amplify-app-buildspec>
         App -> Maybe (Value Text)
buildSpec :: (Prelude.Maybe (Value Prelude.Text)),
         -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-amplify-app.html#cfn-amplify-app-cacheconfig>
         App -> Maybe CacheConfigProperty
cacheConfig :: (Prelude.Maybe CacheConfigProperty),
         -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-amplify-app.html#cfn-amplify-app-computerolearn>
         App -> Maybe (Value Text)
computeRoleArn :: (Prelude.Maybe (Value Prelude.Text)),
         -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-amplify-app.html#cfn-amplify-app-customheaders>
         App -> Maybe (Value Text)
customHeaders :: (Prelude.Maybe (Value Prelude.Text)),
         -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-amplify-app.html#cfn-amplify-app-customrules>
         App -> Maybe [CustomRuleProperty]
customRules :: (Prelude.Maybe [CustomRuleProperty]),
         -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-amplify-app.html#cfn-amplify-app-description>
         App -> Maybe (Value Text)
description :: (Prelude.Maybe (Value Prelude.Text)),
         -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-amplify-app.html#cfn-amplify-app-enablebranchautodeletion>
         App -> Maybe (Value Bool)
enableBranchAutoDeletion :: (Prelude.Maybe (Value Prelude.Bool)),
         -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-amplify-app.html#cfn-amplify-app-environmentvariables>
         App -> Maybe [EnvironmentVariableProperty]
environmentVariables :: (Prelude.Maybe [EnvironmentVariableProperty]),
         -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-amplify-app.html#cfn-amplify-app-iamservicerole>
         App -> Maybe (Value Text)
iAMServiceRole :: (Prelude.Maybe (Value Prelude.Text)),
         -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-amplify-app.html#cfn-amplify-app-jobconfig>
         App -> Maybe JobConfigProperty
jobConfig :: (Prelude.Maybe JobConfigProperty),
         -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-amplify-app.html#cfn-amplify-app-name>
         App -> Value Text
name :: (Value Prelude.Text),
         -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-amplify-app.html#cfn-amplify-app-oauthtoken>
         App -> Maybe (Value Text)
oauthToken :: (Prelude.Maybe (Value Prelude.Text)),
         -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-amplify-app.html#cfn-amplify-app-platform>
         App -> Maybe (Value Text)
platform :: (Prelude.Maybe (Value Prelude.Text)),
         -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-amplify-app.html#cfn-amplify-app-repository>
         App -> Maybe (Value Text)
repository :: (Prelude.Maybe (Value Prelude.Text)),
         -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-amplify-app.html#cfn-amplify-app-tags>
         App -> Maybe [Tag]
tags :: (Prelude.Maybe [Tag])}
  deriving stock (App -> App -> Bool
(App -> App -> Bool) -> (App -> App -> Bool) -> Eq App
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: App -> App -> Bool
== :: App -> App -> Bool
$c/= :: App -> App -> Bool
/= :: App -> App -> Bool
Prelude.Eq, Int -> App -> ShowS
[App] -> ShowS
App -> String
(Int -> App -> ShowS)
-> (App -> String) -> ([App] -> ShowS) -> Show App
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> App -> ShowS
showsPrec :: Int -> App -> ShowS
$cshow :: App -> String
show :: App -> String
$cshowList :: [App] -> ShowS
showList :: [App] -> ShowS
Prelude.Show)
mkApp :: Value Prelude.Text -> App
mkApp :: Value Text -> App
mkApp Value Text
name
  = App
      {haddock_workaround_ :: ()
haddock_workaround_ = (), name :: Value Text
name = Value Text
name,
       accessToken :: Maybe (Value Text)
accessToken = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
autoBranchCreationConfig = Maybe AutoBranchCreationConfigProperty
forall a. Maybe a
Prelude.Nothing,
       basicAuthConfig :: Maybe BasicAuthConfigProperty
basicAuthConfig = Maybe BasicAuthConfigProperty
forall a. Maybe a
Prelude.Nothing, buildSpec :: Maybe (Value Text)
buildSpec = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       cacheConfig :: Maybe CacheConfigProperty
cacheConfig = Maybe CacheConfigProperty
forall a. Maybe a
Prelude.Nothing, computeRoleArn :: Maybe (Value Text)
computeRoleArn = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       customHeaders :: Maybe (Value Text)
customHeaders = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing, customRules :: Maybe [CustomRuleProperty]
customRules = Maybe [CustomRuleProperty]
forall a. Maybe a
Prelude.Nothing,
       description :: Maybe (Value Text)
description = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       enableBranchAutoDeletion :: Maybe (Value Bool)
enableBranchAutoDeletion = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing,
       environmentVariables :: Maybe [EnvironmentVariableProperty]
environmentVariables = Maybe [EnvironmentVariableProperty]
forall a. Maybe a
Prelude.Nothing,
       iAMServiceRole :: Maybe (Value Text)
iAMServiceRole = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing, jobConfig :: Maybe JobConfigProperty
jobConfig = Maybe JobConfigProperty
forall a. Maybe a
Prelude.Nothing,
       oauthToken :: Maybe (Value Text)
oauthToken = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing, platform :: Maybe (Value Text)
platform = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       repository :: Maybe (Value Text)
repository = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing, tags :: Maybe [Tag]
tags = Maybe [Tag]
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties App where
  toResourceProperties :: App -> ResourceProperties
toResourceProperties App {Maybe [Tag]
Maybe [CustomRuleProperty]
Maybe [EnvironmentVariableProperty]
Maybe (Value Bool)
Maybe (Value Text)
Maybe BasicAuthConfigProperty
Maybe CacheConfigProperty
Maybe AutoBranchCreationConfigProperty
Maybe JobConfigProperty
()
Value Text
haddock_workaround_ :: App -> ()
accessToken :: App -> Maybe (Value Text)
autoBranchCreationConfig :: App -> Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: App -> Maybe BasicAuthConfigProperty
buildSpec :: App -> Maybe (Value Text)
cacheConfig :: App -> Maybe CacheConfigProperty
computeRoleArn :: App -> Maybe (Value Text)
customHeaders :: App -> Maybe (Value Text)
customRules :: App -> Maybe [CustomRuleProperty]
description :: App -> Maybe (Value Text)
enableBranchAutoDeletion :: App -> Maybe (Value Bool)
environmentVariables :: App -> Maybe [EnvironmentVariableProperty]
iAMServiceRole :: App -> Maybe (Value Text)
jobConfig :: App -> Maybe JobConfigProperty
name :: App -> Value Text
oauthToken :: App -> Maybe (Value Text)
platform :: App -> Maybe (Value Text)
repository :: App -> Maybe (Value Text)
tags :: App -> Maybe [Tag]
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
    = ResourceProperties
        {awsType :: Text
awsType = Text
"AWS::Amplify::App", supportsTags :: Bool
supportsTags = Bool
Prelude.True,
         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
"Name" 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
name]
                           ([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
"AccessToken" (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)
accessToken,
                               Key -> AutoBranchCreationConfigProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"AutoBranchCreationConfig"
                                 (AutoBranchCreationConfigProperty -> (Key, Value))
-> Maybe AutoBranchCreationConfigProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe AutoBranchCreationConfigProperty
autoBranchCreationConfig,
                               Key -> BasicAuthConfigProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"BasicAuthConfig" (BasicAuthConfigProperty -> (Key, Value))
-> Maybe BasicAuthConfigProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe BasicAuthConfigProperty
basicAuthConfig,
                               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
"BuildSpec" (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)
buildSpec,
                               Key -> CacheConfigProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"CacheConfig" (CacheConfigProperty -> (Key, Value))
-> Maybe CacheConfigProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe CacheConfigProperty
cacheConfig,
                               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
"ComputeRoleArn" (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)
computeRoleArn,
                               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
"CustomHeaders" (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)
customHeaders,
                               Key -> [CustomRuleProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"CustomRules" ([CustomRuleProperty] -> (Key, Value))
-> Maybe [CustomRuleProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [CustomRuleProperty]
customRules,
                               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
"Description" (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)
description,
                               Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"EnableBranchAutoDeletion"
                                 (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
enableBranchAutoDeletion,
                               Key -> [EnvironmentVariableProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"EnvironmentVariables" ([EnvironmentVariableProperty] -> (Key, Value))
-> Maybe [EnvironmentVariableProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [EnvironmentVariableProperty]
environmentVariables,
                               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
"IAMServiceRole" (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)
iAMServiceRole,
                               Key -> JobConfigProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"JobConfig" (JobConfigProperty -> (Key, Value))
-> Maybe JobConfigProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe JobConfigProperty
jobConfig,
                               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
"OauthToken" (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)
oauthToken,
                               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
"Platform" (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)
platform,
                               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
"Repository" (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)
repository,
                               Key -> [Tag] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Tags" ([Tag] -> (Key, Value)) -> Maybe [Tag] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [Tag]
tags]))}
instance JSON.ToJSON App where
  toJSON :: App -> Value
toJSON App {Maybe [Tag]
Maybe [CustomRuleProperty]
Maybe [EnvironmentVariableProperty]
Maybe (Value Bool)
Maybe (Value Text)
Maybe BasicAuthConfigProperty
Maybe CacheConfigProperty
Maybe AutoBranchCreationConfigProperty
Maybe JobConfigProperty
()
Value Text
haddock_workaround_ :: App -> ()
accessToken :: App -> Maybe (Value Text)
autoBranchCreationConfig :: App -> Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: App -> Maybe BasicAuthConfigProperty
buildSpec :: App -> Maybe (Value Text)
cacheConfig :: App -> Maybe CacheConfigProperty
computeRoleArn :: App -> Maybe (Value Text)
customHeaders :: App -> Maybe (Value Text)
customRules :: App -> Maybe [CustomRuleProperty]
description :: App -> Maybe (Value Text)
enableBranchAutoDeletion :: App -> Maybe (Value Bool)
environmentVariables :: App -> Maybe [EnvironmentVariableProperty]
iAMServiceRole :: App -> Maybe (Value Text)
jobConfig :: App -> Maybe JobConfigProperty
name :: App -> Value Text
oauthToken :: App -> Maybe (Value Text)
platform :: App -> Maybe (Value Text)
repository :: App -> Maybe (Value Text)
tags :: App -> Maybe [Tag]
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
    = [(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
"Name" 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
name]
              ([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
"AccessToken" (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)
accessToken,
                  Key -> AutoBranchCreationConfigProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"AutoBranchCreationConfig"
                    (AutoBranchCreationConfigProperty -> (Key, Value))
-> Maybe AutoBranchCreationConfigProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe AutoBranchCreationConfigProperty
autoBranchCreationConfig,
                  Key -> BasicAuthConfigProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"BasicAuthConfig" (BasicAuthConfigProperty -> (Key, Value))
-> Maybe BasicAuthConfigProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe BasicAuthConfigProperty
basicAuthConfig,
                  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
"BuildSpec" (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)
buildSpec,
                  Key -> CacheConfigProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"CacheConfig" (CacheConfigProperty -> (Key, Value))
-> Maybe CacheConfigProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe CacheConfigProperty
cacheConfig,
                  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
"ComputeRoleArn" (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)
computeRoleArn,
                  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
"CustomHeaders" (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)
customHeaders,
                  Key -> [CustomRuleProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"CustomRules" ([CustomRuleProperty] -> (Key, Value))
-> Maybe [CustomRuleProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [CustomRuleProperty]
customRules,
                  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
"Description" (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)
description,
                  Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"EnableBranchAutoDeletion"
                    (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
enableBranchAutoDeletion,
                  Key -> [EnvironmentVariableProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"EnvironmentVariables" ([EnvironmentVariableProperty] -> (Key, Value))
-> Maybe [EnvironmentVariableProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [EnvironmentVariableProperty]
environmentVariables,
                  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
"IAMServiceRole" (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)
iAMServiceRole,
                  Key -> JobConfigProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"JobConfig" (JobConfigProperty -> (Key, Value))
-> Maybe JobConfigProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe JobConfigProperty
jobConfig,
                  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
"OauthToken" (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)
oauthToken,
                  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
"Platform" (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)
platform,
                  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
"Repository" (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)
repository,
                  Key -> [Tag] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Tags" ([Tag] -> (Key, Value)) -> Maybe [Tag] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [Tag]
tags])))
instance Property "AccessToken" App where
  type PropertyType "AccessToken" App = Value Prelude.Text
  set :: PropertyType "AccessToken" App -> App -> App
set PropertyType "AccessToken" App
newValue App {Maybe [Tag]
Maybe [CustomRuleProperty]
Maybe [EnvironmentVariableProperty]
Maybe (Value Bool)
Maybe (Value Text)
Maybe BasicAuthConfigProperty
Maybe CacheConfigProperty
Maybe AutoBranchCreationConfigProperty
Maybe JobConfigProperty
()
Value Text
haddock_workaround_ :: App -> ()
accessToken :: App -> Maybe (Value Text)
autoBranchCreationConfig :: App -> Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: App -> Maybe BasicAuthConfigProperty
buildSpec :: App -> Maybe (Value Text)
cacheConfig :: App -> Maybe CacheConfigProperty
computeRoleArn :: App -> Maybe (Value Text)
customHeaders :: App -> Maybe (Value Text)
customRules :: App -> Maybe [CustomRuleProperty]
description :: App -> Maybe (Value Text)
enableBranchAutoDeletion :: App -> Maybe (Value Bool)
environmentVariables :: App -> Maybe [EnvironmentVariableProperty]
iAMServiceRole :: App -> Maybe (Value Text)
jobConfig :: App -> Maybe JobConfigProperty
name :: App -> Value Text
oauthToken :: App -> Maybe (Value Text)
platform :: App -> Maybe (Value Text)
repository :: App -> Maybe (Value Text)
tags :: App -> Maybe [Tag]
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
    = App {accessToken :: Maybe (Value Text)
accessToken = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "AccessToken" App
Value Text
newValue, Maybe [Tag]
Maybe [CustomRuleProperty]
Maybe [EnvironmentVariableProperty]
Maybe (Value Bool)
Maybe (Value Text)
Maybe BasicAuthConfigProperty
Maybe CacheConfigProperty
Maybe AutoBranchCreationConfigProperty
Maybe JobConfigProperty
()
Value Text
haddock_workaround_ :: ()
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
haddock_workaround_ :: ()
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
instance Property "AutoBranchCreationConfig" App where
  type PropertyType "AutoBranchCreationConfig" App = AutoBranchCreationConfigProperty
  set :: PropertyType "AutoBranchCreationConfig" App -> App -> App
set PropertyType "AutoBranchCreationConfig" App
newValue App {Maybe [Tag]
Maybe [CustomRuleProperty]
Maybe [EnvironmentVariableProperty]
Maybe (Value Bool)
Maybe (Value Text)
Maybe BasicAuthConfigProperty
Maybe CacheConfigProperty
Maybe AutoBranchCreationConfigProperty
Maybe JobConfigProperty
()
Value Text
haddock_workaround_ :: App -> ()
accessToken :: App -> Maybe (Value Text)
autoBranchCreationConfig :: App -> Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: App -> Maybe BasicAuthConfigProperty
buildSpec :: App -> Maybe (Value Text)
cacheConfig :: App -> Maybe CacheConfigProperty
computeRoleArn :: App -> Maybe (Value Text)
customHeaders :: App -> Maybe (Value Text)
customRules :: App -> Maybe [CustomRuleProperty]
description :: App -> Maybe (Value Text)
enableBranchAutoDeletion :: App -> Maybe (Value Bool)
environmentVariables :: App -> Maybe [EnvironmentVariableProperty]
iAMServiceRole :: App -> Maybe (Value Text)
jobConfig :: App -> Maybe JobConfigProperty
name :: App -> Value Text
oauthToken :: App -> Maybe (Value Text)
platform :: App -> Maybe (Value Text)
repository :: App -> Maybe (Value Text)
tags :: App -> Maybe [Tag]
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
    = App {autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
autoBranchCreationConfig = AutoBranchCreationConfigProperty
-> Maybe AutoBranchCreationConfigProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "AutoBranchCreationConfig" App
AutoBranchCreationConfigProperty
newValue, Maybe [Tag]
Maybe [CustomRuleProperty]
Maybe [EnvironmentVariableProperty]
Maybe (Value Bool)
Maybe (Value Text)
Maybe BasicAuthConfigProperty
Maybe CacheConfigProperty
Maybe JobConfigProperty
()
Value Text
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
instance Property "BasicAuthConfig" App where
  type PropertyType "BasicAuthConfig" App = BasicAuthConfigProperty
  set :: PropertyType "BasicAuthConfig" App -> App -> App
set PropertyType "BasicAuthConfig" App
newValue App {Maybe [Tag]
Maybe [CustomRuleProperty]
Maybe [EnvironmentVariableProperty]
Maybe (Value Bool)
Maybe (Value Text)
Maybe BasicAuthConfigProperty
Maybe CacheConfigProperty
Maybe AutoBranchCreationConfigProperty
Maybe JobConfigProperty
()
Value Text
haddock_workaround_ :: App -> ()
accessToken :: App -> Maybe (Value Text)
autoBranchCreationConfig :: App -> Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: App -> Maybe BasicAuthConfigProperty
buildSpec :: App -> Maybe (Value Text)
cacheConfig :: App -> Maybe CacheConfigProperty
computeRoleArn :: App -> Maybe (Value Text)
customHeaders :: App -> Maybe (Value Text)
customRules :: App -> Maybe [CustomRuleProperty]
description :: App -> Maybe (Value Text)
enableBranchAutoDeletion :: App -> Maybe (Value Bool)
environmentVariables :: App -> Maybe [EnvironmentVariableProperty]
iAMServiceRole :: App -> Maybe (Value Text)
jobConfig :: App -> Maybe JobConfigProperty
name :: App -> Value Text
oauthToken :: App -> Maybe (Value Text)
platform :: App -> Maybe (Value Text)
repository :: App -> Maybe (Value Text)
tags :: App -> Maybe [Tag]
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
    = App {basicAuthConfig :: Maybe BasicAuthConfigProperty
basicAuthConfig = BasicAuthConfigProperty -> Maybe BasicAuthConfigProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "BasicAuthConfig" App
BasicAuthConfigProperty
newValue, Maybe [Tag]
Maybe [CustomRuleProperty]
Maybe [EnvironmentVariableProperty]
Maybe (Value Bool)
Maybe (Value Text)
Maybe CacheConfigProperty
Maybe AutoBranchCreationConfigProperty
Maybe JobConfigProperty
()
Value Text
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
instance Property "BuildSpec" App where
  type PropertyType "BuildSpec" App = Value Prelude.Text
  set :: PropertyType "BuildSpec" App -> App -> App
set PropertyType "BuildSpec" App
newValue App {Maybe [Tag]
Maybe [CustomRuleProperty]
Maybe [EnvironmentVariableProperty]
Maybe (Value Bool)
Maybe (Value Text)
Maybe BasicAuthConfigProperty
Maybe CacheConfigProperty
Maybe AutoBranchCreationConfigProperty
Maybe JobConfigProperty
()
Value Text
haddock_workaround_ :: App -> ()
accessToken :: App -> Maybe (Value Text)
autoBranchCreationConfig :: App -> Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: App -> Maybe BasicAuthConfigProperty
buildSpec :: App -> Maybe (Value Text)
cacheConfig :: App -> Maybe CacheConfigProperty
computeRoleArn :: App -> Maybe (Value Text)
customHeaders :: App -> Maybe (Value Text)
customRules :: App -> Maybe [CustomRuleProperty]
description :: App -> Maybe (Value Text)
enableBranchAutoDeletion :: App -> Maybe (Value Bool)
environmentVariables :: App -> Maybe [EnvironmentVariableProperty]
iAMServiceRole :: App -> Maybe (Value Text)
jobConfig :: App -> Maybe JobConfigProperty
name :: App -> Value Text
oauthToken :: App -> Maybe (Value Text)
platform :: App -> Maybe (Value Text)
repository :: App -> Maybe (Value Text)
tags :: App -> Maybe [Tag]
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
..} = App {buildSpec :: Maybe (Value Text)
buildSpec = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "BuildSpec" App
Value Text
newValue, Maybe [Tag]
Maybe [CustomRuleProperty]
Maybe [EnvironmentVariableProperty]
Maybe (Value Bool)
Maybe (Value Text)
Maybe BasicAuthConfigProperty
Maybe CacheConfigProperty
Maybe AutoBranchCreationConfigProperty
Maybe JobConfigProperty
()
Value Text
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
instance Property "CacheConfig" App where
  type PropertyType "CacheConfig" App = CacheConfigProperty
  set :: PropertyType "CacheConfig" App -> App -> App
set PropertyType "CacheConfig" App
newValue App {Maybe [Tag]
Maybe [CustomRuleProperty]
Maybe [EnvironmentVariableProperty]
Maybe (Value Bool)
Maybe (Value Text)
Maybe BasicAuthConfigProperty
Maybe CacheConfigProperty
Maybe AutoBranchCreationConfigProperty
Maybe JobConfigProperty
()
Value Text
haddock_workaround_ :: App -> ()
accessToken :: App -> Maybe (Value Text)
autoBranchCreationConfig :: App -> Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: App -> Maybe BasicAuthConfigProperty
buildSpec :: App -> Maybe (Value Text)
cacheConfig :: App -> Maybe CacheConfigProperty
computeRoleArn :: App -> Maybe (Value Text)
customHeaders :: App -> Maybe (Value Text)
customRules :: App -> Maybe [CustomRuleProperty]
description :: App -> Maybe (Value Text)
enableBranchAutoDeletion :: App -> Maybe (Value Bool)
environmentVariables :: App -> Maybe [EnvironmentVariableProperty]
iAMServiceRole :: App -> Maybe (Value Text)
jobConfig :: App -> Maybe JobConfigProperty
name :: App -> Value Text
oauthToken :: App -> Maybe (Value Text)
platform :: App -> Maybe (Value Text)
repository :: App -> Maybe (Value Text)
tags :: App -> Maybe [Tag]
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
    = App {cacheConfig :: Maybe CacheConfigProperty
cacheConfig = CacheConfigProperty -> Maybe CacheConfigProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "CacheConfig" App
CacheConfigProperty
newValue, Maybe [Tag]
Maybe [CustomRuleProperty]
Maybe [EnvironmentVariableProperty]
Maybe (Value Bool)
Maybe (Value Text)
Maybe BasicAuthConfigProperty
Maybe AutoBranchCreationConfigProperty
Maybe JobConfigProperty
()
Value Text
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
instance Property "ComputeRoleArn" App where
  type PropertyType "ComputeRoleArn" App = Value Prelude.Text
  set :: PropertyType "ComputeRoleArn" App -> App -> App
set PropertyType "ComputeRoleArn" App
newValue App {Maybe [Tag]
Maybe [CustomRuleProperty]
Maybe [EnvironmentVariableProperty]
Maybe (Value Bool)
Maybe (Value Text)
Maybe BasicAuthConfigProperty
Maybe CacheConfigProperty
Maybe AutoBranchCreationConfigProperty
Maybe JobConfigProperty
()
Value Text
haddock_workaround_ :: App -> ()
accessToken :: App -> Maybe (Value Text)
autoBranchCreationConfig :: App -> Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: App -> Maybe BasicAuthConfigProperty
buildSpec :: App -> Maybe (Value Text)
cacheConfig :: App -> Maybe CacheConfigProperty
computeRoleArn :: App -> Maybe (Value Text)
customHeaders :: App -> Maybe (Value Text)
customRules :: App -> Maybe [CustomRuleProperty]
description :: App -> Maybe (Value Text)
enableBranchAutoDeletion :: App -> Maybe (Value Bool)
environmentVariables :: App -> Maybe [EnvironmentVariableProperty]
iAMServiceRole :: App -> Maybe (Value Text)
jobConfig :: App -> Maybe JobConfigProperty
name :: App -> Value Text
oauthToken :: App -> Maybe (Value Text)
platform :: App -> Maybe (Value Text)
repository :: App -> Maybe (Value Text)
tags :: App -> Maybe [Tag]
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
    = App {computeRoleArn :: Maybe (Value Text)
computeRoleArn = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "ComputeRoleArn" App
Value Text
newValue, Maybe [Tag]
Maybe [CustomRuleProperty]
Maybe [EnvironmentVariableProperty]
Maybe (Value Bool)
Maybe (Value Text)
Maybe BasicAuthConfigProperty
Maybe CacheConfigProperty
Maybe AutoBranchCreationConfigProperty
Maybe JobConfigProperty
()
Value Text
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
instance Property "CustomHeaders" App where
  type PropertyType "CustomHeaders" App = Value Prelude.Text
  set :: PropertyType "CustomHeaders" App -> App -> App
set PropertyType "CustomHeaders" App
newValue App {Maybe [Tag]
Maybe [CustomRuleProperty]
Maybe [EnvironmentVariableProperty]
Maybe (Value Bool)
Maybe (Value Text)
Maybe BasicAuthConfigProperty
Maybe CacheConfigProperty
Maybe AutoBranchCreationConfigProperty
Maybe JobConfigProperty
()
Value Text
haddock_workaround_ :: App -> ()
accessToken :: App -> Maybe (Value Text)
autoBranchCreationConfig :: App -> Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: App -> Maybe BasicAuthConfigProperty
buildSpec :: App -> Maybe (Value Text)
cacheConfig :: App -> Maybe CacheConfigProperty
computeRoleArn :: App -> Maybe (Value Text)
customHeaders :: App -> Maybe (Value Text)
customRules :: App -> Maybe [CustomRuleProperty]
description :: App -> Maybe (Value Text)
enableBranchAutoDeletion :: App -> Maybe (Value Bool)
environmentVariables :: App -> Maybe [EnvironmentVariableProperty]
iAMServiceRole :: App -> Maybe (Value Text)
jobConfig :: App -> Maybe JobConfigProperty
name :: App -> Value Text
oauthToken :: App -> Maybe (Value Text)
platform :: App -> Maybe (Value Text)
repository :: App -> Maybe (Value Text)
tags :: App -> Maybe [Tag]
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
    = App {customHeaders :: Maybe (Value Text)
customHeaders = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "CustomHeaders" App
Value Text
newValue, Maybe [Tag]
Maybe [CustomRuleProperty]
Maybe [EnvironmentVariableProperty]
Maybe (Value Bool)
Maybe (Value Text)
Maybe BasicAuthConfigProperty
Maybe CacheConfigProperty
Maybe AutoBranchCreationConfigProperty
Maybe JobConfigProperty
()
Value Text
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
instance Property "CustomRules" App where
  type PropertyType "CustomRules" App = [CustomRuleProperty]
  set :: PropertyType "CustomRules" App -> App -> App
set PropertyType "CustomRules" App
newValue App {Maybe [Tag]
Maybe [CustomRuleProperty]
Maybe [EnvironmentVariableProperty]
Maybe (Value Bool)
Maybe (Value Text)
Maybe BasicAuthConfigProperty
Maybe CacheConfigProperty
Maybe AutoBranchCreationConfigProperty
Maybe JobConfigProperty
()
Value Text
haddock_workaround_ :: App -> ()
accessToken :: App -> Maybe (Value Text)
autoBranchCreationConfig :: App -> Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: App -> Maybe BasicAuthConfigProperty
buildSpec :: App -> Maybe (Value Text)
cacheConfig :: App -> Maybe CacheConfigProperty
computeRoleArn :: App -> Maybe (Value Text)
customHeaders :: App -> Maybe (Value Text)
customRules :: App -> Maybe [CustomRuleProperty]
description :: App -> Maybe (Value Text)
enableBranchAutoDeletion :: App -> Maybe (Value Bool)
environmentVariables :: App -> Maybe [EnvironmentVariableProperty]
iAMServiceRole :: App -> Maybe (Value Text)
jobConfig :: App -> Maybe JobConfigProperty
name :: App -> Value Text
oauthToken :: App -> Maybe (Value Text)
platform :: App -> Maybe (Value Text)
repository :: App -> Maybe (Value Text)
tags :: App -> Maybe [Tag]
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
    = App {customRules :: Maybe [CustomRuleProperty]
customRules = [CustomRuleProperty] -> Maybe [CustomRuleProperty]
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure [CustomRuleProperty]
PropertyType "CustomRules" App
newValue, Maybe [Tag]
Maybe [EnvironmentVariableProperty]
Maybe (Value Bool)
Maybe (Value Text)
Maybe BasicAuthConfigProperty
Maybe CacheConfigProperty
Maybe AutoBranchCreationConfigProperty
Maybe JobConfigProperty
()
Value Text
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
instance Property "Description" App where
  type PropertyType "Description" App = Value Prelude.Text
  set :: PropertyType "Description" App -> App -> App
set PropertyType "Description" App
newValue App {Maybe [Tag]
Maybe [CustomRuleProperty]
Maybe [EnvironmentVariableProperty]
Maybe (Value Bool)
Maybe (Value Text)
Maybe BasicAuthConfigProperty
Maybe CacheConfigProperty
Maybe AutoBranchCreationConfigProperty
Maybe JobConfigProperty
()
Value Text
haddock_workaround_ :: App -> ()
accessToken :: App -> Maybe (Value Text)
autoBranchCreationConfig :: App -> Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: App -> Maybe BasicAuthConfigProperty
buildSpec :: App -> Maybe (Value Text)
cacheConfig :: App -> Maybe CacheConfigProperty
computeRoleArn :: App -> Maybe (Value Text)
customHeaders :: App -> Maybe (Value Text)
customRules :: App -> Maybe [CustomRuleProperty]
description :: App -> Maybe (Value Text)
enableBranchAutoDeletion :: App -> Maybe (Value Bool)
environmentVariables :: App -> Maybe [EnvironmentVariableProperty]
iAMServiceRole :: App -> Maybe (Value Text)
jobConfig :: App -> Maybe JobConfigProperty
name :: App -> Value Text
oauthToken :: App -> Maybe (Value Text)
platform :: App -> Maybe (Value Text)
repository :: App -> Maybe (Value Text)
tags :: App -> Maybe [Tag]
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
    = App {description :: Maybe (Value Text)
description = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Description" App
Value Text
newValue, Maybe [Tag]
Maybe [CustomRuleProperty]
Maybe [EnvironmentVariableProperty]
Maybe (Value Bool)
Maybe (Value Text)
Maybe BasicAuthConfigProperty
Maybe CacheConfigProperty
Maybe AutoBranchCreationConfigProperty
Maybe JobConfigProperty
()
Value Text
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
instance Property "EnableBranchAutoDeletion" App where
  type PropertyType "EnableBranchAutoDeletion" App = Value Prelude.Bool
  set :: PropertyType "EnableBranchAutoDeletion" App -> App -> App
set PropertyType "EnableBranchAutoDeletion" App
newValue App {Maybe [Tag]
Maybe [CustomRuleProperty]
Maybe [EnvironmentVariableProperty]
Maybe (Value Bool)
Maybe (Value Text)
Maybe BasicAuthConfigProperty
Maybe CacheConfigProperty
Maybe AutoBranchCreationConfigProperty
Maybe JobConfigProperty
()
Value Text
haddock_workaround_ :: App -> ()
accessToken :: App -> Maybe (Value Text)
autoBranchCreationConfig :: App -> Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: App -> Maybe BasicAuthConfigProperty
buildSpec :: App -> Maybe (Value Text)
cacheConfig :: App -> Maybe CacheConfigProperty
computeRoleArn :: App -> Maybe (Value Text)
customHeaders :: App -> Maybe (Value Text)
customRules :: App -> Maybe [CustomRuleProperty]
description :: App -> Maybe (Value Text)
enableBranchAutoDeletion :: App -> Maybe (Value Bool)
environmentVariables :: App -> Maybe [EnvironmentVariableProperty]
iAMServiceRole :: App -> Maybe (Value Text)
jobConfig :: App -> Maybe JobConfigProperty
name :: App -> Value Text
oauthToken :: App -> Maybe (Value Text)
platform :: App -> Maybe (Value Text)
repository :: App -> Maybe (Value Text)
tags :: App -> Maybe [Tag]
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
    = App {enableBranchAutoDeletion :: Maybe (Value Bool)
enableBranchAutoDeletion = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "EnableBranchAutoDeletion" App
Value Bool
newValue, Maybe [Tag]
Maybe [CustomRuleProperty]
Maybe [EnvironmentVariableProperty]
Maybe (Value Text)
Maybe BasicAuthConfigProperty
Maybe CacheConfigProperty
Maybe AutoBranchCreationConfigProperty
Maybe JobConfigProperty
()
Value Text
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
instance Property "EnvironmentVariables" App where
  type PropertyType "EnvironmentVariables" App = [EnvironmentVariableProperty]
  set :: PropertyType "EnvironmentVariables" App -> App -> App
set PropertyType "EnvironmentVariables" App
newValue App {Maybe [Tag]
Maybe [CustomRuleProperty]
Maybe [EnvironmentVariableProperty]
Maybe (Value Bool)
Maybe (Value Text)
Maybe BasicAuthConfigProperty
Maybe CacheConfigProperty
Maybe AutoBranchCreationConfigProperty
Maybe JobConfigProperty
()
Value Text
haddock_workaround_ :: App -> ()
accessToken :: App -> Maybe (Value Text)
autoBranchCreationConfig :: App -> Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: App -> Maybe BasicAuthConfigProperty
buildSpec :: App -> Maybe (Value Text)
cacheConfig :: App -> Maybe CacheConfigProperty
computeRoleArn :: App -> Maybe (Value Text)
customHeaders :: App -> Maybe (Value Text)
customRules :: App -> Maybe [CustomRuleProperty]
description :: App -> Maybe (Value Text)
enableBranchAutoDeletion :: App -> Maybe (Value Bool)
environmentVariables :: App -> Maybe [EnvironmentVariableProperty]
iAMServiceRole :: App -> Maybe (Value Text)
jobConfig :: App -> Maybe JobConfigProperty
name :: App -> Value Text
oauthToken :: App -> Maybe (Value Text)
platform :: App -> Maybe (Value Text)
repository :: App -> Maybe (Value Text)
tags :: App -> Maybe [Tag]
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
    = App {environmentVariables :: Maybe [EnvironmentVariableProperty]
environmentVariables = [EnvironmentVariableProperty]
-> Maybe [EnvironmentVariableProperty]
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure [EnvironmentVariableProperty]
PropertyType "EnvironmentVariables" App
newValue, Maybe [Tag]
Maybe [CustomRuleProperty]
Maybe (Value Bool)
Maybe (Value Text)
Maybe BasicAuthConfigProperty
Maybe CacheConfigProperty
Maybe AutoBranchCreationConfigProperty
Maybe JobConfigProperty
()
Value Text
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
instance Property "IAMServiceRole" App where
  type PropertyType "IAMServiceRole" App = Value Prelude.Text
  set :: PropertyType "IAMServiceRole" App -> App -> App
set PropertyType "IAMServiceRole" App
newValue App {Maybe [Tag]
Maybe [CustomRuleProperty]
Maybe [EnvironmentVariableProperty]
Maybe (Value Bool)
Maybe (Value Text)
Maybe BasicAuthConfigProperty
Maybe CacheConfigProperty
Maybe AutoBranchCreationConfigProperty
Maybe JobConfigProperty
()
Value Text
haddock_workaround_ :: App -> ()
accessToken :: App -> Maybe (Value Text)
autoBranchCreationConfig :: App -> Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: App -> Maybe BasicAuthConfigProperty
buildSpec :: App -> Maybe (Value Text)
cacheConfig :: App -> Maybe CacheConfigProperty
computeRoleArn :: App -> Maybe (Value Text)
customHeaders :: App -> Maybe (Value Text)
customRules :: App -> Maybe [CustomRuleProperty]
description :: App -> Maybe (Value Text)
enableBranchAutoDeletion :: App -> Maybe (Value Bool)
environmentVariables :: App -> Maybe [EnvironmentVariableProperty]
iAMServiceRole :: App -> Maybe (Value Text)
jobConfig :: App -> Maybe JobConfigProperty
name :: App -> Value Text
oauthToken :: App -> Maybe (Value Text)
platform :: App -> Maybe (Value Text)
repository :: App -> Maybe (Value Text)
tags :: App -> Maybe [Tag]
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
    = App {iAMServiceRole :: Maybe (Value Text)
iAMServiceRole = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "IAMServiceRole" App
Value Text
newValue, Maybe [Tag]
Maybe [CustomRuleProperty]
Maybe [EnvironmentVariableProperty]
Maybe (Value Bool)
Maybe (Value Text)
Maybe BasicAuthConfigProperty
Maybe CacheConfigProperty
Maybe AutoBranchCreationConfigProperty
Maybe JobConfigProperty
()
Value Text
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
instance Property "JobConfig" App where
  type PropertyType "JobConfig" App = JobConfigProperty
  set :: PropertyType "JobConfig" App -> App -> App
set PropertyType "JobConfig" App
newValue App {Maybe [Tag]
Maybe [CustomRuleProperty]
Maybe [EnvironmentVariableProperty]
Maybe (Value Bool)
Maybe (Value Text)
Maybe BasicAuthConfigProperty
Maybe CacheConfigProperty
Maybe AutoBranchCreationConfigProperty
Maybe JobConfigProperty
()
Value Text
haddock_workaround_ :: App -> ()
accessToken :: App -> Maybe (Value Text)
autoBranchCreationConfig :: App -> Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: App -> Maybe BasicAuthConfigProperty
buildSpec :: App -> Maybe (Value Text)
cacheConfig :: App -> Maybe CacheConfigProperty
computeRoleArn :: App -> Maybe (Value Text)
customHeaders :: App -> Maybe (Value Text)
customRules :: App -> Maybe [CustomRuleProperty]
description :: App -> Maybe (Value Text)
enableBranchAutoDeletion :: App -> Maybe (Value Bool)
environmentVariables :: App -> Maybe [EnvironmentVariableProperty]
iAMServiceRole :: App -> Maybe (Value Text)
jobConfig :: App -> Maybe JobConfigProperty
name :: App -> Value Text
oauthToken :: App -> Maybe (Value Text)
platform :: App -> Maybe (Value Text)
repository :: App -> Maybe (Value Text)
tags :: App -> Maybe [Tag]
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
..} = App {jobConfig :: Maybe JobConfigProperty
jobConfig = JobConfigProperty -> Maybe JobConfigProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "JobConfig" App
JobConfigProperty
newValue, Maybe [Tag]
Maybe [CustomRuleProperty]
Maybe [EnvironmentVariableProperty]
Maybe (Value Bool)
Maybe (Value Text)
Maybe BasicAuthConfigProperty
Maybe CacheConfigProperty
Maybe AutoBranchCreationConfigProperty
()
Value Text
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
instance Property "Name" App where
  type PropertyType "Name" App = Value Prelude.Text
  set :: PropertyType "Name" App -> App -> App
set PropertyType "Name" App
newValue App {Maybe [Tag]
Maybe [CustomRuleProperty]
Maybe [EnvironmentVariableProperty]
Maybe (Value Bool)
Maybe (Value Text)
Maybe BasicAuthConfigProperty
Maybe CacheConfigProperty
Maybe AutoBranchCreationConfigProperty
Maybe JobConfigProperty
()
Value Text
haddock_workaround_ :: App -> ()
accessToken :: App -> Maybe (Value Text)
autoBranchCreationConfig :: App -> Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: App -> Maybe BasicAuthConfigProperty
buildSpec :: App -> Maybe (Value Text)
cacheConfig :: App -> Maybe CacheConfigProperty
computeRoleArn :: App -> Maybe (Value Text)
customHeaders :: App -> Maybe (Value Text)
customRules :: App -> Maybe [CustomRuleProperty]
description :: App -> Maybe (Value Text)
enableBranchAutoDeletion :: App -> Maybe (Value Bool)
environmentVariables :: App -> Maybe [EnvironmentVariableProperty]
iAMServiceRole :: App -> Maybe (Value Text)
jobConfig :: App -> Maybe JobConfigProperty
name :: App -> Value Text
oauthToken :: App -> Maybe (Value Text)
platform :: App -> Maybe (Value Text)
repository :: App -> Maybe (Value Text)
tags :: App -> Maybe [Tag]
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
..} = App {name :: Value Text
name = PropertyType "Name" App
Value Text
newValue, Maybe [Tag]
Maybe [CustomRuleProperty]
Maybe [EnvironmentVariableProperty]
Maybe (Value Bool)
Maybe (Value Text)
Maybe BasicAuthConfigProperty
Maybe CacheConfigProperty
Maybe AutoBranchCreationConfigProperty
Maybe JobConfigProperty
()
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
instance Property "OauthToken" App where
  type PropertyType "OauthToken" App = Value Prelude.Text
  set :: PropertyType "OauthToken" App -> App -> App
set PropertyType "OauthToken" App
newValue App {Maybe [Tag]
Maybe [CustomRuleProperty]
Maybe [EnvironmentVariableProperty]
Maybe (Value Bool)
Maybe (Value Text)
Maybe BasicAuthConfigProperty
Maybe CacheConfigProperty
Maybe AutoBranchCreationConfigProperty
Maybe JobConfigProperty
()
Value Text
haddock_workaround_ :: App -> ()
accessToken :: App -> Maybe (Value Text)
autoBranchCreationConfig :: App -> Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: App -> Maybe BasicAuthConfigProperty
buildSpec :: App -> Maybe (Value Text)
cacheConfig :: App -> Maybe CacheConfigProperty
computeRoleArn :: App -> Maybe (Value Text)
customHeaders :: App -> Maybe (Value Text)
customRules :: App -> Maybe [CustomRuleProperty]
description :: App -> Maybe (Value Text)
enableBranchAutoDeletion :: App -> Maybe (Value Bool)
environmentVariables :: App -> Maybe [EnvironmentVariableProperty]
iAMServiceRole :: App -> Maybe (Value Text)
jobConfig :: App -> Maybe JobConfigProperty
name :: App -> Value Text
oauthToken :: App -> Maybe (Value Text)
platform :: App -> Maybe (Value Text)
repository :: App -> Maybe (Value Text)
tags :: App -> Maybe [Tag]
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
    = App {oauthToken :: Maybe (Value Text)
oauthToken = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "OauthToken" App
Value Text
newValue, Maybe [Tag]
Maybe [CustomRuleProperty]
Maybe [EnvironmentVariableProperty]
Maybe (Value Bool)
Maybe (Value Text)
Maybe BasicAuthConfigProperty
Maybe CacheConfigProperty
Maybe AutoBranchCreationConfigProperty
Maybe JobConfigProperty
()
Value Text
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
instance Property "Platform" App where
  type PropertyType "Platform" App = Value Prelude.Text
  set :: PropertyType "Platform" App -> App -> App
set PropertyType "Platform" App
newValue App {Maybe [Tag]
Maybe [CustomRuleProperty]
Maybe [EnvironmentVariableProperty]
Maybe (Value Bool)
Maybe (Value Text)
Maybe BasicAuthConfigProperty
Maybe CacheConfigProperty
Maybe AutoBranchCreationConfigProperty
Maybe JobConfigProperty
()
Value Text
haddock_workaround_ :: App -> ()
accessToken :: App -> Maybe (Value Text)
autoBranchCreationConfig :: App -> Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: App -> Maybe BasicAuthConfigProperty
buildSpec :: App -> Maybe (Value Text)
cacheConfig :: App -> Maybe CacheConfigProperty
computeRoleArn :: App -> Maybe (Value Text)
customHeaders :: App -> Maybe (Value Text)
customRules :: App -> Maybe [CustomRuleProperty]
description :: App -> Maybe (Value Text)
enableBranchAutoDeletion :: App -> Maybe (Value Bool)
environmentVariables :: App -> Maybe [EnvironmentVariableProperty]
iAMServiceRole :: App -> Maybe (Value Text)
jobConfig :: App -> Maybe JobConfigProperty
name :: App -> Value Text
oauthToken :: App -> Maybe (Value Text)
platform :: App -> Maybe (Value Text)
repository :: App -> Maybe (Value Text)
tags :: App -> Maybe [Tag]
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
..} = App {platform :: Maybe (Value Text)
platform = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Platform" App
Value Text
newValue, Maybe [Tag]
Maybe [CustomRuleProperty]
Maybe [EnvironmentVariableProperty]
Maybe (Value Bool)
Maybe (Value Text)
Maybe BasicAuthConfigProperty
Maybe CacheConfigProperty
Maybe AutoBranchCreationConfigProperty
Maybe JobConfigProperty
()
Value Text
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
instance Property "Repository" App where
  type PropertyType "Repository" App = Value Prelude.Text
  set :: PropertyType "Repository" App -> App -> App
set PropertyType "Repository" App
newValue App {Maybe [Tag]
Maybe [CustomRuleProperty]
Maybe [EnvironmentVariableProperty]
Maybe (Value Bool)
Maybe (Value Text)
Maybe BasicAuthConfigProperty
Maybe CacheConfigProperty
Maybe AutoBranchCreationConfigProperty
Maybe JobConfigProperty
()
Value Text
haddock_workaround_ :: App -> ()
accessToken :: App -> Maybe (Value Text)
autoBranchCreationConfig :: App -> Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: App -> Maybe BasicAuthConfigProperty
buildSpec :: App -> Maybe (Value Text)
cacheConfig :: App -> Maybe CacheConfigProperty
computeRoleArn :: App -> Maybe (Value Text)
customHeaders :: App -> Maybe (Value Text)
customRules :: App -> Maybe [CustomRuleProperty]
description :: App -> Maybe (Value Text)
enableBranchAutoDeletion :: App -> Maybe (Value Bool)
environmentVariables :: App -> Maybe [EnvironmentVariableProperty]
iAMServiceRole :: App -> Maybe (Value Text)
jobConfig :: App -> Maybe JobConfigProperty
name :: App -> Value Text
oauthToken :: App -> Maybe (Value Text)
platform :: App -> Maybe (Value Text)
repository :: App -> Maybe (Value Text)
tags :: App -> Maybe [Tag]
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
    = App {repository :: Maybe (Value Text)
repository = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Repository" App
Value Text
newValue, Maybe [Tag]
Maybe [CustomRuleProperty]
Maybe [EnvironmentVariableProperty]
Maybe (Value Bool)
Maybe (Value Text)
Maybe BasicAuthConfigProperty
Maybe CacheConfigProperty
Maybe AutoBranchCreationConfigProperty
Maybe JobConfigProperty
()
Value Text
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
tags :: Maybe [Tag]
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
tags :: Maybe [Tag]
..}
instance Property "Tags" App where
  type PropertyType "Tags" App = [Tag]
  set :: PropertyType "Tags" App -> App -> App
set PropertyType "Tags" App
newValue App {Maybe [Tag]
Maybe [CustomRuleProperty]
Maybe [EnvironmentVariableProperty]
Maybe (Value Bool)
Maybe (Value Text)
Maybe BasicAuthConfigProperty
Maybe CacheConfigProperty
Maybe AutoBranchCreationConfigProperty
Maybe JobConfigProperty
()
Value Text
haddock_workaround_ :: App -> ()
accessToken :: App -> Maybe (Value Text)
autoBranchCreationConfig :: App -> Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: App -> Maybe BasicAuthConfigProperty
buildSpec :: App -> Maybe (Value Text)
cacheConfig :: App -> Maybe CacheConfigProperty
computeRoleArn :: App -> Maybe (Value Text)
customHeaders :: App -> Maybe (Value Text)
customRules :: App -> Maybe [CustomRuleProperty]
description :: App -> Maybe (Value Text)
enableBranchAutoDeletion :: App -> Maybe (Value Bool)
environmentVariables :: App -> Maybe [EnvironmentVariableProperty]
iAMServiceRole :: App -> Maybe (Value Text)
jobConfig :: App -> Maybe JobConfigProperty
name :: App -> Value Text
oauthToken :: App -> Maybe (Value Text)
platform :: App -> Maybe (Value Text)
repository :: App -> Maybe (Value Text)
tags :: App -> Maybe [Tag]
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
tags :: Maybe [Tag]
..} = App {tags :: Maybe [Tag]
tags = [Tag] -> Maybe [Tag]
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure [Tag]
PropertyType "Tags" App
newValue, Maybe [CustomRuleProperty]
Maybe [EnvironmentVariableProperty]
Maybe (Value Bool)
Maybe (Value Text)
Maybe BasicAuthConfigProperty
Maybe CacheConfigProperty
Maybe AutoBranchCreationConfigProperty
Maybe JobConfigProperty
()
Value Text
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
haddock_workaround_ :: ()
accessToken :: Maybe (Value Text)
autoBranchCreationConfig :: Maybe AutoBranchCreationConfigProperty
basicAuthConfig :: Maybe BasicAuthConfigProperty
buildSpec :: Maybe (Value Text)
cacheConfig :: Maybe CacheConfigProperty
computeRoleArn :: Maybe (Value Text)
customHeaders :: Maybe (Value Text)
customRules :: Maybe [CustomRuleProperty]
description :: Maybe (Value Text)
enableBranchAutoDeletion :: Maybe (Value Bool)
environmentVariables :: Maybe [EnvironmentVariableProperty]
iAMServiceRole :: Maybe (Value Text)
jobConfig :: Maybe JobConfigProperty
name :: Value Text
oauthToken :: Maybe (Value Text)
platform :: Maybe (Value Text)
repository :: Maybe (Value Text)
..}