module Stratosphere.Batch.JobDefinition.ContainerPropertiesProperty (
module Exports, ContainerPropertiesProperty(..),
mkContainerPropertiesProperty
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.Batch.JobDefinition.EnvironmentProperty as Exports
import {-# SOURCE #-} Stratosphere.Batch.JobDefinition.EphemeralStorageProperty as Exports
import {-# SOURCE #-} Stratosphere.Batch.JobDefinition.FargatePlatformConfigurationProperty as Exports
import {-# SOURCE #-} Stratosphere.Batch.JobDefinition.LinuxParametersProperty as Exports
import {-# SOURCE #-} Stratosphere.Batch.JobDefinition.LogConfigurationProperty as Exports
import {-# SOURCE #-} Stratosphere.Batch.JobDefinition.MountPointProperty as Exports
import {-# SOURCE #-} Stratosphere.Batch.JobDefinition.NetworkConfigurationProperty as Exports
import {-# SOURCE #-} Stratosphere.Batch.JobDefinition.RepositoryCredentialsProperty as Exports
import {-# SOURCE #-} Stratosphere.Batch.JobDefinition.ResourceRequirementProperty as Exports
import {-# SOURCE #-} Stratosphere.Batch.JobDefinition.RuntimePlatformProperty as Exports
import {-# SOURCE #-} Stratosphere.Batch.JobDefinition.SecretProperty as Exports
import {-# SOURCE #-} Stratosphere.Batch.JobDefinition.UlimitProperty as Exports
import {-# SOURCE #-} Stratosphere.Batch.JobDefinition.VolumeProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Value
data ContainerPropertiesProperty
=
ContainerPropertiesProperty {ContainerPropertiesProperty -> ()
haddock_workaround_ :: (),
ContainerPropertiesProperty -> Maybe (ValueList Text)
command :: (Prelude.Maybe (ValueList Prelude.Text)),
ContainerPropertiesProperty -> Maybe (Value Bool)
enableExecuteCommand :: (Prelude.Maybe (Value Prelude.Bool)),
ContainerPropertiesProperty -> Maybe [EnvironmentProperty]
environment :: (Prelude.Maybe [EnvironmentProperty]),
ContainerPropertiesProperty -> Maybe EphemeralStorageProperty
ephemeralStorage :: (Prelude.Maybe EphemeralStorageProperty),
ContainerPropertiesProperty -> Maybe (Value Text)
executionRoleArn :: (Prelude.Maybe (Value Prelude.Text)),
ContainerPropertiesProperty
-> Maybe FargatePlatformConfigurationProperty
fargatePlatformConfiguration :: (Prelude.Maybe FargatePlatformConfigurationProperty),
ContainerPropertiesProperty -> Value Text
image :: (Value Prelude.Text),
ContainerPropertiesProperty -> Maybe (Value Text)
jobRoleArn :: (Prelude.Maybe (Value Prelude.Text)),
ContainerPropertiesProperty -> Maybe LinuxParametersProperty
linuxParameters :: (Prelude.Maybe LinuxParametersProperty),
ContainerPropertiesProperty -> Maybe LogConfigurationProperty
logConfiguration :: (Prelude.Maybe LogConfigurationProperty),
ContainerPropertiesProperty -> Maybe (Value Integer)
memory :: (Prelude.Maybe (Value Prelude.Integer)),
ContainerPropertiesProperty -> Maybe [MountPointProperty]
mountPoints :: (Prelude.Maybe [MountPointProperty]),
ContainerPropertiesProperty -> Maybe NetworkConfigurationProperty
networkConfiguration :: (Prelude.Maybe NetworkConfigurationProperty),
ContainerPropertiesProperty -> Maybe (Value Bool)
privileged :: (Prelude.Maybe (Value Prelude.Bool)),
ContainerPropertiesProperty -> Maybe (Value Bool)
readonlyRootFilesystem :: (Prelude.Maybe (Value Prelude.Bool)),
ContainerPropertiesProperty -> Maybe RepositoryCredentialsProperty
repositoryCredentials :: (Prelude.Maybe RepositoryCredentialsProperty),
ContainerPropertiesProperty -> Maybe [ResourceRequirementProperty]
resourceRequirements :: (Prelude.Maybe [ResourceRequirementProperty]),
ContainerPropertiesProperty -> Maybe RuntimePlatformProperty
runtimePlatform :: (Prelude.Maybe RuntimePlatformProperty),
ContainerPropertiesProperty -> Maybe [SecretProperty]
secrets :: (Prelude.Maybe [SecretProperty]),
ContainerPropertiesProperty -> Maybe [UlimitProperty]
ulimits :: (Prelude.Maybe [UlimitProperty]),
ContainerPropertiesProperty -> Maybe (Value Text)
user :: (Prelude.Maybe (Value Prelude.Text)),
ContainerPropertiesProperty -> Maybe (Value Integer)
vcpus :: (Prelude.Maybe (Value Prelude.Integer)),
ContainerPropertiesProperty -> Maybe [VolumeProperty]
volumes :: (Prelude.Maybe [VolumeProperty])}
deriving stock (ContainerPropertiesProperty -> ContainerPropertiesProperty -> Bool
(ContainerPropertiesProperty
-> ContainerPropertiesProperty -> Bool)
-> (ContainerPropertiesProperty
-> ContainerPropertiesProperty -> Bool)
-> Eq ContainerPropertiesProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: ContainerPropertiesProperty -> ContainerPropertiesProperty -> Bool
== :: ContainerPropertiesProperty -> ContainerPropertiesProperty -> Bool
$c/= :: ContainerPropertiesProperty -> ContainerPropertiesProperty -> Bool
/= :: ContainerPropertiesProperty -> ContainerPropertiesProperty -> Bool
Prelude.Eq, Int -> ContainerPropertiesProperty -> ShowS
[ContainerPropertiesProperty] -> ShowS
ContainerPropertiesProperty -> String
(Int -> ContainerPropertiesProperty -> ShowS)
-> (ContainerPropertiesProperty -> String)
-> ([ContainerPropertiesProperty] -> ShowS)
-> Show ContainerPropertiesProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> ContainerPropertiesProperty -> ShowS
showsPrec :: Int -> ContainerPropertiesProperty -> ShowS
$cshow :: ContainerPropertiesProperty -> String
show :: ContainerPropertiesProperty -> String
$cshowList :: [ContainerPropertiesProperty] -> ShowS
showList :: [ContainerPropertiesProperty] -> ShowS
Prelude.Show)
mkContainerPropertiesProperty ::
Value Prelude.Text -> ContainerPropertiesProperty
mkContainerPropertiesProperty :: Value Text -> ContainerPropertiesProperty
mkContainerPropertiesProperty Value Text
image
= ContainerPropertiesProperty
{haddock_workaround_ :: ()
haddock_workaround_ = (), image :: Value Text
image = Value Text
image,
command :: Maybe (ValueList Text)
command = Maybe (ValueList Text)
forall a. Maybe a
Prelude.Nothing, enableExecuteCommand :: Maybe (Value Bool)
enableExecuteCommand = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing,
environment :: Maybe [EnvironmentProperty]
environment = Maybe [EnvironmentProperty]
forall a. Maybe a
Prelude.Nothing, ephemeralStorage :: Maybe EphemeralStorageProperty
ephemeralStorage = Maybe EphemeralStorageProperty
forall a. Maybe a
Prelude.Nothing,
executionRoleArn :: Maybe (Value Text)
executionRoleArn = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
fargatePlatformConfiguration = Maybe FargatePlatformConfigurationProperty
forall a. Maybe a
Prelude.Nothing,
jobRoleArn :: Maybe (Value Text)
jobRoleArn = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing, linuxParameters :: Maybe LinuxParametersProperty
linuxParameters = Maybe LinuxParametersProperty
forall a. Maybe a
Prelude.Nothing,
logConfiguration :: Maybe LogConfigurationProperty
logConfiguration = Maybe LogConfigurationProperty
forall a. Maybe a
Prelude.Nothing, memory :: Maybe (Value Integer)
memory = Maybe (Value Integer)
forall a. Maybe a
Prelude.Nothing,
mountPoints :: Maybe [MountPointProperty]
mountPoints = Maybe [MountPointProperty]
forall a. Maybe a
Prelude.Nothing,
networkConfiguration :: Maybe NetworkConfigurationProperty
networkConfiguration = Maybe NetworkConfigurationProperty
forall a. Maybe a
Prelude.Nothing,
privileged :: Maybe (Value Bool)
privileged = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing,
readonlyRootFilesystem :: Maybe (Value Bool)
readonlyRootFilesystem = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing,
repositoryCredentials :: Maybe RepositoryCredentialsProperty
repositoryCredentials = Maybe RepositoryCredentialsProperty
forall a. Maybe a
Prelude.Nothing,
resourceRequirements :: Maybe [ResourceRequirementProperty]
resourceRequirements = Maybe [ResourceRequirementProperty]
forall a. Maybe a
Prelude.Nothing,
runtimePlatform :: Maybe RuntimePlatformProperty
runtimePlatform = Maybe RuntimePlatformProperty
forall a. Maybe a
Prelude.Nothing, secrets :: Maybe [SecretProperty]
secrets = Maybe [SecretProperty]
forall a. Maybe a
Prelude.Nothing,
ulimits :: Maybe [UlimitProperty]
ulimits = Maybe [UlimitProperty]
forall a. Maybe a
Prelude.Nothing, user :: Maybe (Value Text)
user = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
vcpus :: Maybe (Value Integer)
vcpus = Maybe (Value Integer)
forall a. Maybe a
Prelude.Nothing, volumes :: Maybe [VolumeProperty]
volumes = Maybe [VolumeProperty]
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties ContainerPropertiesProperty where
toResourceProperties :: ContainerPropertiesProperty -> ResourceProperties
toResourceProperties ContainerPropertiesProperty {Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ContainerPropertiesProperty -> ()
command :: ContainerPropertiesProperty -> Maybe (ValueList Text)
enableExecuteCommand :: ContainerPropertiesProperty -> Maybe (Value Bool)
environment :: ContainerPropertiesProperty -> Maybe [EnvironmentProperty]
ephemeralStorage :: ContainerPropertiesProperty -> Maybe EphemeralStorageProperty
executionRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
fargatePlatformConfiguration :: ContainerPropertiesProperty
-> Maybe FargatePlatformConfigurationProperty
image :: ContainerPropertiesProperty -> Value Text
jobRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
linuxParameters :: ContainerPropertiesProperty -> Maybe LinuxParametersProperty
logConfiguration :: ContainerPropertiesProperty -> Maybe LogConfigurationProperty
memory :: ContainerPropertiesProperty -> Maybe (Value Integer)
mountPoints :: ContainerPropertiesProperty -> Maybe [MountPointProperty]
networkConfiguration :: ContainerPropertiesProperty -> Maybe NetworkConfigurationProperty
privileged :: ContainerPropertiesProperty -> Maybe (Value Bool)
readonlyRootFilesystem :: ContainerPropertiesProperty -> Maybe (Value Bool)
repositoryCredentials :: ContainerPropertiesProperty -> Maybe RepositoryCredentialsProperty
resourceRequirements :: ContainerPropertiesProperty -> Maybe [ResourceRequirementProperty]
runtimePlatform :: ContainerPropertiesProperty -> Maybe RuntimePlatformProperty
secrets :: ContainerPropertiesProperty -> Maybe [SecretProperty]
ulimits :: ContainerPropertiesProperty -> Maybe [UlimitProperty]
user :: ContainerPropertiesProperty -> Maybe (Value Text)
vcpus :: ContainerPropertiesProperty -> Maybe (Value Integer)
volumes :: ContainerPropertiesProperty -> Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::Batch::JobDefinition.ContainerProperties",
supportsTags :: Bool
supportsTags = Bool
Prelude.False,
properties :: Object
properties = [Item Object] -> Object
forall l. IsList l => [Item l] -> l
Prelude.fromList
([(Key, Value)] -> [(Key, Value)] -> [(Key, Value)]
forall a. Semigroup a => a -> a -> a
(Prelude.<>)
[Key
"Image" 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
image]
([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
[Key -> ValueList 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
"Command" (ValueList Text -> (Key, Value))
-> Maybe (ValueList Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (ValueList Text)
command,
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
"EnableExecuteCommand" (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)
enableExecuteCommand,
Key -> [EnvironmentProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Environment" ([EnvironmentProperty] -> (Key, Value))
-> Maybe [EnvironmentProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [EnvironmentProperty]
environment,
Key -> EphemeralStorageProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"EphemeralStorage" (EphemeralStorageProperty -> (Key, Value))
-> Maybe EphemeralStorageProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe EphemeralStorageProperty
ephemeralStorage,
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
"ExecutionRoleArn" (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)
executionRoleArn,
Key -> FargatePlatformConfigurationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"FargatePlatformConfiguration"
(FargatePlatformConfigurationProperty -> (Key, Value))
-> Maybe FargatePlatformConfigurationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe FargatePlatformConfigurationProperty
fargatePlatformConfiguration,
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
"JobRoleArn" (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)
jobRoleArn,
Key -> LinuxParametersProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"LinuxParameters" (LinuxParametersProperty -> (Key, Value))
-> Maybe LinuxParametersProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe LinuxParametersProperty
linuxParameters,
Key -> LogConfigurationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"LogConfiguration" (LogConfigurationProperty -> (Key, Value))
-> Maybe LogConfigurationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe LogConfigurationProperty
logConfiguration,
Key -> Value Integer -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Memory" (Value Integer -> (Key, Value))
-> Maybe (Value Integer) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Integer)
memory,
Key -> [MountPointProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"MountPoints" ([MountPointProperty] -> (Key, Value))
-> Maybe [MountPointProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [MountPointProperty]
mountPoints,
Key -> NetworkConfigurationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"NetworkConfiguration" (NetworkConfigurationProperty -> (Key, Value))
-> Maybe NetworkConfigurationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe NetworkConfigurationProperty
networkConfiguration,
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
"Privileged" (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)
privileged,
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
"ReadonlyRootFilesystem"
(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)
readonlyRootFilesystem,
Key -> RepositoryCredentialsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"RepositoryCredentials"
(RepositoryCredentialsProperty -> (Key, Value))
-> Maybe RepositoryCredentialsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe RepositoryCredentialsProperty
repositoryCredentials,
Key -> [ResourceRequirementProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"ResourceRequirements" ([ResourceRequirementProperty] -> (Key, Value))
-> Maybe [ResourceRequirementProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [ResourceRequirementProperty]
resourceRequirements,
Key -> RuntimePlatformProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"RuntimePlatform" (RuntimePlatformProperty -> (Key, Value))
-> Maybe RuntimePlatformProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe RuntimePlatformProperty
runtimePlatform,
Key -> [SecretProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Secrets" ([SecretProperty] -> (Key, Value))
-> Maybe [SecretProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [SecretProperty]
secrets,
Key -> [UlimitProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Ulimits" ([UlimitProperty] -> (Key, Value))
-> Maybe [UlimitProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [UlimitProperty]
ulimits,
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
"User" (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)
user,
Key -> Value Integer -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Vcpus" (Value Integer -> (Key, Value))
-> Maybe (Value Integer) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Integer)
vcpus,
Key -> [VolumeProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Volumes" ([VolumeProperty] -> (Key, Value))
-> Maybe [VolumeProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [VolumeProperty]
volumes]))}
instance JSON.ToJSON ContainerPropertiesProperty where
toJSON :: ContainerPropertiesProperty -> Value
toJSON ContainerPropertiesProperty {Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ContainerPropertiesProperty -> ()
command :: ContainerPropertiesProperty -> Maybe (ValueList Text)
enableExecuteCommand :: ContainerPropertiesProperty -> Maybe (Value Bool)
environment :: ContainerPropertiesProperty -> Maybe [EnvironmentProperty]
ephemeralStorage :: ContainerPropertiesProperty -> Maybe EphemeralStorageProperty
executionRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
fargatePlatformConfiguration :: ContainerPropertiesProperty
-> Maybe FargatePlatformConfigurationProperty
image :: ContainerPropertiesProperty -> Value Text
jobRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
linuxParameters :: ContainerPropertiesProperty -> Maybe LinuxParametersProperty
logConfiguration :: ContainerPropertiesProperty -> Maybe LogConfigurationProperty
memory :: ContainerPropertiesProperty -> Maybe (Value Integer)
mountPoints :: ContainerPropertiesProperty -> Maybe [MountPointProperty]
networkConfiguration :: ContainerPropertiesProperty -> Maybe NetworkConfigurationProperty
privileged :: ContainerPropertiesProperty -> Maybe (Value Bool)
readonlyRootFilesystem :: ContainerPropertiesProperty -> Maybe (Value Bool)
repositoryCredentials :: ContainerPropertiesProperty -> Maybe RepositoryCredentialsProperty
resourceRequirements :: ContainerPropertiesProperty -> Maybe [ResourceRequirementProperty]
runtimePlatform :: ContainerPropertiesProperty -> Maybe RuntimePlatformProperty
secrets :: ContainerPropertiesProperty -> Maybe [SecretProperty]
ulimits :: ContainerPropertiesProperty -> Maybe [UlimitProperty]
user :: ContainerPropertiesProperty -> Maybe (Value Text)
vcpus :: ContainerPropertiesProperty -> Maybe (Value Integer)
volumes :: ContainerPropertiesProperty -> Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
= [(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
"Image" 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
image]
([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
[Key -> ValueList 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
"Command" (ValueList Text -> (Key, Value))
-> Maybe (ValueList Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (ValueList Text)
command,
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
"EnableExecuteCommand" (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)
enableExecuteCommand,
Key -> [EnvironmentProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Environment" ([EnvironmentProperty] -> (Key, Value))
-> Maybe [EnvironmentProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [EnvironmentProperty]
environment,
Key -> EphemeralStorageProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"EphemeralStorage" (EphemeralStorageProperty -> (Key, Value))
-> Maybe EphemeralStorageProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe EphemeralStorageProperty
ephemeralStorage,
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
"ExecutionRoleArn" (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)
executionRoleArn,
Key -> FargatePlatformConfigurationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"FargatePlatformConfiguration"
(FargatePlatformConfigurationProperty -> (Key, Value))
-> Maybe FargatePlatformConfigurationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe FargatePlatformConfigurationProperty
fargatePlatformConfiguration,
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
"JobRoleArn" (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)
jobRoleArn,
Key -> LinuxParametersProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"LinuxParameters" (LinuxParametersProperty -> (Key, Value))
-> Maybe LinuxParametersProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe LinuxParametersProperty
linuxParameters,
Key -> LogConfigurationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"LogConfiguration" (LogConfigurationProperty -> (Key, Value))
-> Maybe LogConfigurationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe LogConfigurationProperty
logConfiguration,
Key -> Value Integer -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Memory" (Value Integer -> (Key, Value))
-> Maybe (Value Integer) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Integer)
memory,
Key -> [MountPointProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"MountPoints" ([MountPointProperty] -> (Key, Value))
-> Maybe [MountPointProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [MountPointProperty]
mountPoints,
Key -> NetworkConfigurationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"NetworkConfiguration" (NetworkConfigurationProperty -> (Key, Value))
-> Maybe NetworkConfigurationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe NetworkConfigurationProperty
networkConfiguration,
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
"Privileged" (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)
privileged,
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
"ReadonlyRootFilesystem"
(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)
readonlyRootFilesystem,
Key -> RepositoryCredentialsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"RepositoryCredentials"
(RepositoryCredentialsProperty -> (Key, Value))
-> Maybe RepositoryCredentialsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe RepositoryCredentialsProperty
repositoryCredentials,
Key -> [ResourceRequirementProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"ResourceRequirements" ([ResourceRequirementProperty] -> (Key, Value))
-> Maybe [ResourceRequirementProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [ResourceRequirementProperty]
resourceRequirements,
Key -> RuntimePlatformProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"RuntimePlatform" (RuntimePlatformProperty -> (Key, Value))
-> Maybe RuntimePlatformProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe RuntimePlatformProperty
runtimePlatform,
Key -> [SecretProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Secrets" ([SecretProperty] -> (Key, Value))
-> Maybe [SecretProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [SecretProperty]
secrets,
Key -> [UlimitProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Ulimits" ([UlimitProperty] -> (Key, Value))
-> Maybe [UlimitProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [UlimitProperty]
ulimits,
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
"User" (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)
user,
Key -> Value Integer -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Vcpus" (Value Integer -> (Key, Value))
-> Maybe (Value Integer) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Integer)
vcpus,
Key -> [VolumeProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Volumes" ([VolumeProperty] -> (Key, Value))
-> Maybe [VolumeProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [VolumeProperty]
volumes])))
instance Property "Command" ContainerPropertiesProperty where
type PropertyType "Command" ContainerPropertiesProperty = ValueList Prelude.Text
set :: PropertyType "Command" ContainerPropertiesProperty
-> ContainerPropertiesProperty -> ContainerPropertiesProperty
set PropertyType "Command" ContainerPropertiesProperty
newValue ContainerPropertiesProperty {Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ContainerPropertiesProperty -> ()
command :: ContainerPropertiesProperty -> Maybe (ValueList Text)
enableExecuteCommand :: ContainerPropertiesProperty -> Maybe (Value Bool)
environment :: ContainerPropertiesProperty -> Maybe [EnvironmentProperty]
ephemeralStorage :: ContainerPropertiesProperty -> Maybe EphemeralStorageProperty
executionRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
fargatePlatformConfiguration :: ContainerPropertiesProperty
-> Maybe FargatePlatformConfigurationProperty
image :: ContainerPropertiesProperty -> Value Text
jobRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
linuxParameters :: ContainerPropertiesProperty -> Maybe LinuxParametersProperty
logConfiguration :: ContainerPropertiesProperty -> Maybe LogConfigurationProperty
memory :: ContainerPropertiesProperty -> Maybe (Value Integer)
mountPoints :: ContainerPropertiesProperty -> Maybe [MountPointProperty]
networkConfiguration :: ContainerPropertiesProperty -> Maybe NetworkConfigurationProperty
privileged :: ContainerPropertiesProperty -> Maybe (Value Bool)
readonlyRootFilesystem :: ContainerPropertiesProperty -> Maybe (Value Bool)
repositoryCredentials :: ContainerPropertiesProperty -> Maybe RepositoryCredentialsProperty
resourceRequirements :: ContainerPropertiesProperty -> Maybe [ResourceRequirementProperty]
runtimePlatform :: ContainerPropertiesProperty -> Maybe RuntimePlatformProperty
secrets :: ContainerPropertiesProperty -> Maybe [SecretProperty]
ulimits :: ContainerPropertiesProperty -> Maybe [UlimitProperty]
user :: ContainerPropertiesProperty -> Maybe (Value Text)
vcpus :: ContainerPropertiesProperty -> Maybe (Value Integer)
volumes :: ContainerPropertiesProperty -> Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
= ContainerPropertiesProperty {command :: Maybe (ValueList Text)
command = ValueList Text -> Maybe (ValueList Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Command" ContainerPropertiesProperty
ValueList Text
newValue, Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ()
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
haddock_workaround_ :: ()
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
instance Property "EnableExecuteCommand" ContainerPropertiesProperty where
type PropertyType "EnableExecuteCommand" ContainerPropertiesProperty = Value Prelude.Bool
set :: PropertyType "EnableExecuteCommand" ContainerPropertiesProperty
-> ContainerPropertiesProperty -> ContainerPropertiesProperty
set PropertyType "EnableExecuteCommand" ContainerPropertiesProperty
newValue ContainerPropertiesProperty {Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ContainerPropertiesProperty -> ()
command :: ContainerPropertiesProperty -> Maybe (ValueList Text)
enableExecuteCommand :: ContainerPropertiesProperty -> Maybe (Value Bool)
environment :: ContainerPropertiesProperty -> Maybe [EnvironmentProperty]
ephemeralStorage :: ContainerPropertiesProperty -> Maybe EphemeralStorageProperty
executionRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
fargatePlatformConfiguration :: ContainerPropertiesProperty
-> Maybe FargatePlatformConfigurationProperty
image :: ContainerPropertiesProperty -> Value Text
jobRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
linuxParameters :: ContainerPropertiesProperty -> Maybe LinuxParametersProperty
logConfiguration :: ContainerPropertiesProperty -> Maybe LogConfigurationProperty
memory :: ContainerPropertiesProperty -> Maybe (Value Integer)
mountPoints :: ContainerPropertiesProperty -> Maybe [MountPointProperty]
networkConfiguration :: ContainerPropertiesProperty -> Maybe NetworkConfigurationProperty
privileged :: ContainerPropertiesProperty -> Maybe (Value Bool)
readonlyRootFilesystem :: ContainerPropertiesProperty -> Maybe (Value Bool)
repositoryCredentials :: ContainerPropertiesProperty -> Maybe RepositoryCredentialsProperty
resourceRequirements :: ContainerPropertiesProperty -> Maybe [ResourceRequirementProperty]
runtimePlatform :: ContainerPropertiesProperty -> Maybe RuntimePlatformProperty
secrets :: ContainerPropertiesProperty -> Maybe [SecretProperty]
ulimits :: ContainerPropertiesProperty -> Maybe [UlimitProperty]
user :: ContainerPropertiesProperty -> Maybe (Value Text)
vcpus :: ContainerPropertiesProperty -> Maybe (Value Integer)
volumes :: ContainerPropertiesProperty -> Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
= ContainerPropertiesProperty
{enableExecuteCommand :: Maybe (Value Bool)
enableExecuteCommand = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "EnableExecuteCommand" ContainerPropertiesProperty
Value Bool
newValue, Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
instance Property "Environment" ContainerPropertiesProperty where
type PropertyType "Environment" ContainerPropertiesProperty = [EnvironmentProperty]
set :: PropertyType "Environment" ContainerPropertiesProperty
-> ContainerPropertiesProperty -> ContainerPropertiesProperty
set PropertyType "Environment" ContainerPropertiesProperty
newValue ContainerPropertiesProperty {Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ContainerPropertiesProperty -> ()
command :: ContainerPropertiesProperty -> Maybe (ValueList Text)
enableExecuteCommand :: ContainerPropertiesProperty -> Maybe (Value Bool)
environment :: ContainerPropertiesProperty -> Maybe [EnvironmentProperty]
ephemeralStorage :: ContainerPropertiesProperty -> Maybe EphemeralStorageProperty
executionRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
fargatePlatformConfiguration :: ContainerPropertiesProperty
-> Maybe FargatePlatformConfigurationProperty
image :: ContainerPropertiesProperty -> Value Text
jobRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
linuxParameters :: ContainerPropertiesProperty -> Maybe LinuxParametersProperty
logConfiguration :: ContainerPropertiesProperty -> Maybe LogConfigurationProperty
memory :: ContainerPropertiesProperty -> Maybe (Value Integer)
mountPoints :: ContainerPropertiesProperty -> Maybe [MountPointProperty]
networkConfiguration :: ContainerPropertiesProperty -> Maybe NetworkConfigurationProperty
privileged :: ContainerPropertiesProperty -> Maybe (Value Bool)
readonlyRootFilesystem :: ContainerPropertiesProperty -> Maybe (Value Bool)
repositoryCredentials :: ContainerPropertiesProperty -> Maybe RepositoryCredentialsProperty
resourceRequirements :: ContainerPropertiesProperty -> Maybe [ResourceRequirementProperty]
runtimePlatform :: ContainerPropertiesProperty -> Maybe RuntimePlatformProperty
secrets :: ContainerPropertiesProperty -> Maybe [SecretProperty]
ulimits :: ContainerPropertiesProperty -> Maybe [UlimitProperty]
user :: ContainerPropertiesProperty -> Maybe (Value Text)
vcpus :: ContainerPropertiesProperty -> Maybe (Value Integer)
volumes :: ContainerPropertiesProperty -> Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
= ContainerPropertiesProperty
{environment :: Maybe [EnvironmentProperty]
environment = [EnvironmentProperty] -> Maybe [EnvironmentProperty]
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure [EnvironmentProperty]
PropertyType "Environment" ContainerPropertiesProperty
newValue, Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
instance Property "EphemeralStorage" ContainerPropertiesProperty where
type PropertyType "EphemeralStorage" ContainerPropertiesProperty = EphemeralStorageProperty
set :: PropertyType "EphemeralStorage" ContainerPropertiesProperty
-> ContainerPropertiesProperty -> ContainerPropertiesProperty
set PropertyType "EphemeralStorage" ContainerPropertiesProperty
newValue ContainerPropertiesProperty {Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ContainerPropertiesProperty -> ()
command :: ContainerPropertiesProperty -> Maybe (ValueList Text)
enableExecuteCommand :: ContainerPropertiesProperty -> Maybe (Value Bool)
environment :: ContainerPropertiesProperty -> Maybe [EnvironmentProperty]
ephemeralStorage :: ContainerPropertiesProperty -> Maybe EphemeralStorageProperty
executionRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
fargatePlatformConfiguration :: ContainerPropertiesProperty
-> Maybe FargatePlatformConfigurationProperty
image :: ContainerPropertiesProperty -> Value Text
jobRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
linuxParameters :: ContainerPropertiesProperty -> Maybe LinuxParametersProperty
logConfiguration :: ContainerPropertiesProperty -> Maybe LogConfigurationProperty
memory :: ContainerPropertiesProperty -> Maybe (Value Integer)
mountPoints :: ContainerPropertiesProperty -> Maybe [MountPointProperty]
networkConfiguration :: ContainerPropertiesProperty -> Maybe NetworkConfigurationProperty
privileged :: ContainerPropertiesProperty -> Maybe (Value Bool)
readonlyRootFilesystem :: ContainerPropertiesProperty -> Maybe (Value Bool)
repositoryCredentials :: ContainerPropertiesProperty -> Maybe RepositoryCredentialsProperty
resourceRequirements :: ContainerPropertiesProperty -> Maybe [ResourceRequirementProperty]
runtimePlatform :: ContainerPropertiesProperty -> Maybe RuntimePlatformProperty
secrets :: ContainerPropertiesProperty -> Maybe [SecretProperty]
ulimits :: ContainerPropertiesProperty -> Maybe [UlimitProperty]
user :: ContainerPropertiesProperty -> Maybe (Value Text)
vcpus :: ContainerPropertiesProperty -> Maybe (Value Integer)
volumes :: ContainerPropertiesProperty -> Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
= ContainerPropertiesProperty
{ephemeralStorage :: Maybe EphemeralStorageProperty
ephemeralStorage = EphemeralStorageProperty -> Maybe EphemeralStorageProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "EphemeralStorage" ContainerPropertiesProperty
EphemeralStorageProperty
newValue, Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
instance Property "ExecutionRoleArn" ContainerPropertiesProperty where
type PropertyType "ExecutionRoleArn" ContainerPropertiesProperty = Value Prelude.Text
set :: PropertyType "ExecutionRoleArn" ContainerPropertiesProperty
-> ContainerPropertiesProperty -> ContainerPropertiesProperty
set PropertyType "ExecutionRoleArn" ContainerPropertiesProperty
newValue ContainerPropertiesProperty {Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ContainerPropertiesProperty -> ()
command :: ContainerPropertiesProperty -> Maybe (ValueList Text)
enableExecuteCommand :: ContainerPropertiesProperty -> Maybe (Value Bool)
environment :: ContainerPropertiesProperty -> Maybe [EnvironmentProperty]
ephemeralStorage :: ContainerPropertiesProperty -> Maybe EphemeralStorageProperty
executionRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
fargatePlatformConfiguration :: ContainerPropertiesProperty
-> Maybe FargatePlatformConfigurationProperty
image :: ContainerPropertiesProperty -> Value Text
jobRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
linuxParameters :: ContainerPropertiesProperty -> Maybe LinuxParametersProperty
logConfiguration :: ContainerPropertiesProperty -> Maybe LogConfigurationProperty
memory :: ContainerPropertiesProperty -> Maybe (Value Integer)
mountPoints :: ContainerPropertiesProperty -> Maybe [MountPointProperty]
networkConfiguration :: ContainerPropertiesProperty -> Maybe NetworkConfigurationProperty
privileged :: ContainerPropertiesProperty -> Maybe (Value Bool)
readonlyRootFilesystem :: ContainerPropertiesProperty -> Maybe (Value Bool)
repositoryCredentials :: ContainerPropertiesProperty -> Maybe RepositoryCredentialsProperty
resourceRequirements :: ContainerPropertiesProperty -> Maybe [ResourceRequirementProperty]
runtimePlatform :: ContainerPropertiesProperty -> Maybe RuntimePlatformProperty
secrets :: ContainerPropertiesProperty -> Maybe [SecretProperty]
ulimits :: ContainerPropertiesProperty -> Maybe [UlimitProperty]
user :: ContainerPropertiesProperty -> Maybe (Value Text)
vcpus :: ContainerPropertiesProperty -> Maybe (Value Integer)
volumes :: ContainerPropertiesProperty -> Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
= ContainerPropertiesProperty
{executionRoleArn :: Maybe (Value Text)
executionRoleArn = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "ExecutionRoleArn" ContainerPropertiesProperty
Value Text
newValue, Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
instance Property "FargatePlatformConfiguration" ContainerPropertiesProperty where
type PropertyType "FargatePlatformConfiguration" ContainerPropertiesProperty = FargatePlatformConfigurationProperty
set :: PropertyType
"FargatePlatformConfiguration" ContainerPropertiesProperty
-> ContainerPropertiesProperty -> ContainerPropertiesProperty
set PropertyType
"FargatePlatformConfiguration" ContainerPropertiesProperty
newValue ContainerPropertiesProperty {Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ContainerPropertiesProperty -> ()
command :: ContainerPropertiesProperty -> Maybe (ValueList Text)
enableExecuteCommand :: ContainerPropertiesProperty -> Maybe (Value Bool)
environment :: ContainerPropertiesProperty -> Maybe [EnvironmentProperty]
ephemeralStorage :: ContainerPropertiesProperty -> Maybe EphemeralStorageProperty
executionRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
fargatePlatformConfiguration :: ContainerPropertiesProperty
-> Maybe FargatePlatformConfigurationProperty
image :: ContainerPropertiesProperty -> Value Text
jobRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
linuxParameters :: ContainerPropertiesProperty -> Maybe LinuxParametersProperty
logConfiguration :: ContainerPropertiesProperty -> Maybe LogConfigurationProperty
memory :: ContainerPropertiesProperty -> Maybe (Value Integer)
mountPoints :: ContainerPropertiesProperty -> Maybe [MountPointProperty]
networkConfiguration :: ContainerPropertiesProperty -> Maybe NetworkConfigurationProperty
privileged :: ContainerPropertiesProperty -> Maybe (Value Bool)
readonlyRootFilesystem :: ContainerPropertiesProperty -> Maybe (Value Bool)
repositoryCredentials :: ContainerPropertiesProperty -> Maybe RepositoryCredentialsProperty
resourceRequirements :: ContainerPropertiesProperty -> Maybe [ResourceRequirementProperty]
runtimePlatform :: ContainerPropertiesProperty -> Maybe RuntimePlatformProperty
secrets :: ContainerPropertiesProperty -> Maybe [SecretProperty]
ulimits :: ContainerPropertiesProperty -> Maybe [UlimitProperty]
user :: ContainerPropertiesProperty -> Maybe (Value Text)
vcpus :: ContainerPropertiesProperty -> Maybe (Value Integer)
volumes :: ContainerPropertiesProperty -> Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
= ContainerPropertiesProperty
{fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
fargatePlatformConfiguration = FargatePlatformConfigurationProperty
-> Maybe FargatePlatformConfigurationProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
"FargatePlatformConfiguration" ContainerPropertiesProperty
FargatePlatformConfigurationProperty
newValue, Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
instance Property "Image" ContainerPropertiesProperty where
type PropertyType "Image" ContainerPropertiesProperty = Value Prelude.Text
set :: PropertyType "Image" ContainerPropertiesProperty
-> ContainerPropertiesProperty -> ContainerPropertiesProperty
set PropertyType "Image" ContainerPropertiesProperty
newValue ContainerPropertiesProperty {Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ContainerPropertiesProperty -> ()
command :: ContainerPropertiesProperty -> Maybe (ValueList Text)
enableExecuteCommand :: ContainerPropertiesProperty -> Maybe (Value Bool)
environment :: ContainerPropertiesProperty -> Maybe [EnvironmentProperty]
ephemeralStorage :: ContainerPropertiesProperty -> Maybe EphemeralStorageProperty
executionRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
fargatePlatformConfiguration :: ContainerPropertiesProperty
-> Maybe FargatePlatformConfigurationProperty
image :: ContainerPropertiesProperty -> Value Text
jobRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
linuxParameters :: ContainerPropertiesProperty -> Maybe LinuxParametersProperty
logConfiguration :: ContainerPropertiesProperty -> Maybe LogConfigurationProperty
memory :: ContainerPropertiesProperty -> Maybe (Value Integer)
mountPoints :: ContainerPropertiesProperty -> Maybe [MountPointProperty]
networkConfiguration :: ContainerPropertiesProperty -> Maybe NetworkConfigurationProperty
privileged :: ContainerPropertiesProperty -> Maybe (Value Bool)
readonlyRootFilesystem :: ContainerPropertiesProperty -> Maybe (Value Bool)
repositoryCredentials :: ContainerPropertiesProperty -> Maybe RepositoryCredentialsProperty
resourceRequirements :: ContainerPropertiesProperty -> Maybe [ResourceRequirementProperty]
runtimePlatform :: ContainerPropertiesProperty -> Maybe RuntimePlatformProperty
secrets :: ContainerPropertiesProperty -> Maybe [SecretProperty]
ulimits :: ContainerPropertiesProperty -> Maybe [UlimitProperty]
user :: ContainerPropertiesProperty -> Maybe (Value Text)
vcpus :: ContainerPropertiesProperty -> Maybe (Value Integer)
volumes :: ContainerPropertiesProperty -> Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
= ContainerPropertiesProperty {image :: Value Text
image = PropertyType "Image" ContainerPropertiesProperty
Value Text
newValue, Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
instance Property "JobRoleArn" ContainerPropertiesProperty where
type PropertyType "JobRoleArn" ContainerPropertiesProperty = Value Prelude.Text
set :: PropertyType "JobRoleArn" ContainerPropertiesProperty
-> ContainerPropertiesProperty -> ContainerPropertiesProperty
set PropertyType "JobRoleArn" ContainerPropertiesProperty
newValue ContainerPropertiesProperty {Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ContainerPropertiesProperty -> ()
command :: ContainerPropertiesProperty -> Maybe (ValueList Text)
enableExecuteCommand :: ContainerPropertiesProperty -> Maybe (Value Bool)
environment :: ContainerPropertiesProperty -> Maybe [EnvironmentProperty]
ephemeralStorage :: ContainerPropertiesProperty -> Maybe EphemeralStorageProperty
executionRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
fargatePlatformConfiguration :: ContainerPropertiesProperty
-> Maybe FargatePlatformConfigurationProperty
image :: ContainerPropertiesProperty -> Value Text
jobRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
linuxParameters :: ContainerPropertiesProperty -> Maybe LinuxParametersProperty
logConfiguration :: ContainerPropertiesProperty -> Maybe LogConfigurationProperty
memory :: ContainerPropertiesProperty -> Maybe (Value Integer)
mountPoints :: ContainerPropertiesProperty -> Maybe [MountPointProperty]
networkConfiguration :: ContainerPropertiesProperty -> Maybe NetworkConfigurationProperty
privileged :: ContainerPropertiesProperty -> Maybe (Value Bool)
readonlyRootFilesystem :: ContainerPropertiesProperty -> Maybe (Value Bool)
repositoryCredentials :: ContainerPropertiesProperty -> Maybe RepositoryCredentialsProperty
resourceRequirements :: ContainerPropertiesProperty -> Maybe [ResourceRequirementProperty]
runtimePlatform :: ContainerPropertiesProperty -> Maybe RuntimePlatformProperty
secrets :: ContainerPropertiesProperty -> Maybe [SecretProperty]
ulimits :: ContainerPropertiesProperty -> Maybe [UlimitProperty]
user :: ContainerPropertiesProperty -> Maybe (Value Text)
vcpus :: ContainerPropertiesProperty -> Maybe (Value Integer)
volumes :: ContainerPropertiesProperty -> Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
= ContainerPropertiesProperty
{jobRoleArn :: Maybe (Value Text)
jobRoleArn = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "JobRoleArn" ContainerPropertiesProperty
Value Text
newValue, Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
instance Property "LinuxParameters" ContainerPropertiesProperty where
type PropertyType "LinuxParameters" ContainerPropertiesProperty = LinuxParametersProperty
set :: PropertyType "LinuxParameters" ContainerPropertiesProperty
-> ContainerPropertiesProperty -> ContainerPropertiesProperty
set PropertyType "LinuxParameters" ContainerPropertiesProperty
newValue ContainerPropertiesProperty {Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ContainerPropertiesProperty -> ()
command :: ContainerPropertiesProperty -> Maybe (ValueList Text)
enableExecuteCommand :: ContainerPropertiesProperty -> Maybe (Value Bool)
environment :: ContainerPropertiesProperty -> Maybe [EnvironmentProperty]
ephemeralStorage :: ContainerPropertiesProperty -> Maybe EphemeralStorageProperty
executionRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
fargatePlatformConfiguration :: ContainerPropertiesProperty
-> Maybe FargatePlatformConfigurationProperty
image :: ContainerPropertiesProperty -> Value Text
jobRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
linuxParameters :: ContainerPropertiesProperty -> Maybe LinuxParametersProperty
logConfiguration :: ContainerPropertiesProperty -> Maybe LogConfigurationProperty
memory :: ContainerPropertiesProperty -> Maybe (Value Integer)
mountPoints :: ContainerPropertiesProperty -> Maybe [MountPointProperty]
networkConfiguration :: ContainerPropertiesProperty -> Maybe NetworkConfigurationProperty
privileged :: ContainerPropertiesProperty -> Maybe (Value Bool)
readonlyRootFilesystem :: ContainerPropertiesProperty -> Maybe (Value Bool)
repositoryCredentials :: ContainerPropertiesProperty -> Maybe RepositoryCredentialsProperty
resourceRequirements :: ContainerPropertiesProperty -> Maybe [ResourceRequirementProperty]
runtimePlatform :: ContainerPropertiesProperty -> Maybe RuntimePlatformProperty
secrets :: ContainerPropertiesProperty -> Maybe [SecretProperty]
ulimits :: ContainerPropertiesProperty -> Maybe [UlimitProperty]
user :: ContainerPropertiesProperty -> Maybe (Value Text)
vcpus :: ContainerPropertiesProperty -> Maybe (Value Integer)
volumes :: ContainerPropertiesProperty -> Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
= ContainerPropertiesProperty
{linuxParameters :: Maybe LinuxParametersProperty
linuxParameters = LinuxParametersProperty -> Maybe LinuxParametersProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "LinuxParameters" ContainerPropertiesProperty
LinuxParametersProperty
newValue, Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
()
Value Text
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
instance Property "LogConfiguration" ContainerPropertiesProperty where
type PropertyType "LogConfiguration" ContainerPropertiesProperty = LogConfigurationProperty
set :: PropertyType "LogConfiguration" ContainerPropertiesProperty
-> ContainerPropertiesProperty -> ContainerPropertiesProperty
set PropertyType "LogConfiguration" ContainerPropertiesProperty
newValue ContainerPropertiesProperty {Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ContainerPropertiesProperty -> ()
command :: ContainerPropertiesProperty -> Maybe (ValueList Text)
enableExecuteCommand :: ContainerPropertiesProperty -> Maybe (Value Bool)
environment :: ContainerPropertiesProperty -> Maybe [EnvironmentProperty]
ephemeralStorage :: ContainerPropertiesProperty -> Maybe EphemeralStorageProperty
executionRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
fargatePlatformConfiguration :: ContainerPropertiesProperty
-> Maybe FargatePlatformConfigurationProperty
image :: ContainerPropertiesProperty -> Value Text
jobRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
linuxParameters :: ContainerPropertiesProperty -> Maybe LinuxParametersProperty
logConfiguration :: ContainerPropertiesProperty -> Maybe LogConfigurationProperty
memory :: ContainerPropertiesProperty -> Maybe (Value Integer)
mountPoints :: ContainerPropertiesProperty -> Maybe [MountPointProperty]
networkConfiguration :: ContainerPropertiesProperty -> Maybe NetworkConfigurationProperty
privileged :: ContainerPropertiesProperty -> Maybe (Value Bool)
readonlyRootFilesystem :: ContainerPropertiesProperty -> Maybe (Value Bool)
repositoryCredentials :: ContainerPropertiesProperty -> Maybe RepositoryCredentialsProperty
resourceRequirements :: ContainerPropertiesProperty -> Maybe [ResourceRequirementProperty]
runtimePlatform :: ContainerPropertiesProperty -> Maybe RuntimePlatformProperty
secrets :: ContainerPropertiesProperty -> Maybe [SecretProperty]
ulimits :: ContainerPropertiesProperty -> Maybe [UlimitProperty]
user :: ContainerPropertiesProperty -> Maybe (Value Text)
vcpus :: ContainerPropertiesProperty -> Maybe (Value Integer)
volumes :: ContainerPropertiesProperty -> Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
= ContainerPropertiesProperty
{logConfiguration :: Maybe LogConfigurationProperty
logConfiguration = LogConfigurationProperty -> Maybe LogConfigurationProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "LogConfiguration" ContainerPropertiesProperty
LogConfigurationProperty
newValue, Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
instance Property "Memory" ContainerPropertiesProperty where
type PropertyType "Memory" ContainerPropertiesProperty = Value Prelude.Integer
set :: PropertyType "Memory" ContainerPropertiesProperty
-> ContainerPropertiesProperty -> ContainerPropertiesProperty
set PropertyType "Memory" ContainerPropertiesProperty
newValue ContainerPropertiesProperty {Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ContainerPropertiesProperty -> ()
command :: ContainerPropertiesProperty -> Maybe (ValueList Text)
enableExecuteCommand :: ContainerPropertiesProperty -> Maybe (Value Bool)
environment :: ContainerPropertiesProperty -> Maybe [EnvironmentProperty]
ephemeralStorage :: ContainerPropertiesProperty -> Maybe EphemeralStorageProperty
executionRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
fargatePlatformConfiguration :: ContainerPropertiesProperty
-> Maybe FargatePlatformConfigurationProperty
image :: ContainerPropertiesProperty -> Value Text
jobRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
linuxParameters :: ContainerPropertiesProperty -> Maybe LinuxParametersProperty
logConfiguration :: ContainerPropertiesProperty -> Maybe LogConfigurationProperty
memory :: ContainerPropertiesProperty -> Maybe (Value Integer)
mountPoints :: ContainerPropertiesProperty -> Maybe [MountPointProperty]
networkConfiguration :: ContainerPropertiesProperty -> Maybe NetworkConfigurationProperty
privileged :: ContainerPropertiesProperty -> Maybe (Value Bool)
readonlyRootFilesystem :: ContainerPropertiesProperty -> Maybe (Value Bool)
repositoryCredentials :: ContainerPropertiesProperty -> Maybe RepositoryCredentialsProperty
resourceRequirements :: ContainerPropertiesProperty -> Maybe [ResourceRequirementProperty]
runtimePlatform :: ContainerPropertiesProperty -> Maybe RuntimePlatformProperty
secrets :: ContainerPropertiesProperty -> Maybe [SecretProperty]
ulimits :: ContainerPropertiesProperty -> Maybe [UlimitProperty]
user :: ContainerPropertiesProperty -> Maybe (Value Text)
vcpus :: ContainerPropertiesProperty -> Maybe (Value Integer)
volumes :: ContainerPropertiesProperty -> Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
= ContainerPropertiesProperty {memory :: Maybe (Value Integer)
memory = Value Integer -> Maybe (Value Integer)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Memory" ContainerPropertiesProperty
Value Integer
newValue, Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
instance Property "MountPoints" ContainerPropertiesProperty where
type PropertyType "MountPoints" ContainerPropertiesProperty = [MountPointProperty]
set :: PropertyType "MountPoints" ContainerPropertiesProperty
-> ContainerPropertiesProperty -> ContainerPropertiesProperty
set PropertyType "MountPoints" ContainerPropertiesProperty
newValue ContainerPropertiesProperty {Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ContainerPropertiesProperty -> ()
command :: ContainerPropertiesProperty -> Maybe (ValueList Text)
enableExecuteCommand :: ContainerPropertiesProperty -> Maybe (Value Bool)
environment :: ContainerPropertiesProperty -> Maybe [EnvironmentProperty]
ephemeralStorage :: ContainerPropertiesProperty -> Maybe EphemeralStorageProperty
executionRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
fargatePlatformConfiguration :: ContainerPropertiesProperty
-> Maybe FargatePlatformConfigurationProperty
image :: ContainerPropertiesProperty -> Value Text
jobRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
linuxParameters :: ContainerPropertiesProperty -> Maybe LinuxParametersProperty
logConfiguration :: ContainerPropertiesProperty -> Maybe LogConfigurationProperty
memory :: ContainerPropertiesProperty -> Maybe (Value Integer)
mountPoints :: ContainerPropertiesProperty -> Maybe [MountPointProperty]
networkConfiguration :: ContainerPropertiesProperty -> Maybe NetworkConfigurationProperty
privileged :: ContainerPropertiesProperty -> Maybe (Value Bool)
readonlyRootFilesystem :: ContainerPropertiesProperty -> Maybe (Value Bool)
repositoryCredentials :: ContainerPropertiesProperty -> Maybe RepositoryCredentialsProperty
resourceRequirements :: ContainerPropertiesProperty -> Maybe [ResourceRequirementProperty]
runtimePlatform :: ContainerPropertiesProperty -> Maybe RuntimePlatformProperty
secrets :: ContainerPropertiesProperty -> Maybe [SecretProperty]
ulimits :: ContainerPropertiesProperty -> Maybe [UlimitProperty]
user :: ContainerPropertiesProperty -> Maybe (Value Text)
vcpus :: ContainerPropertiesProperty -> Maybe (Value Integer)
volumes :: ContainerPropertiesProperty -> Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
= ContainerPropertiesProperty
{mountPoints :: Maybe [MountPointProperty]
mountPoints = [MountPointProperty] -> Maybe [MountPointProperty]
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure [MountPointProperty]
PropertyType "MountPoints" ContainerPropertiesProperty
newValue, Maybe [EnvironmentProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
instance Property "NetworkConfiguration" ContainerPropertiesProperty where
type PropertyType "NetworkConfiguration" ContainerPropertiesProperty = NetworkConfigurationProperty
set :: PropertyType "NetworkConfiguration" ContainerPropertiesProperty
-> ContainerPropertiesProperty -> ContainerPropertiesProperty
set PropertyType "NetworkConfiguration" ContainerPropertiesProperty
newValue ContainerPropertiesProperty {Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ContainerPropertiesProperty -> ()
command :: ContainerPropertiesProperty -> Maybe (ValueList Text)
enableExecuteCommand :: ContainerPropertiesProperty -> Maybe (Value Bool)
environment :: ContainerPropertiesProperty -> Maybe [EnvironmentProperty]
ephemeralStorage :: ContainerPropertiesProperty -> Maybe EphemeralStorageProperty
executionRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
fargatePlatformConfiguration :: ContainerPropertiesProperty
-> Maybe FargatePlatformConfigurationProperty
image :: ContainerPropertiesProperty -> Value Text
jobRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
linuxParameters :: ContainerPropertiesProperty -> Maybe LinuxParametersProperty
logConfiguration :: ContainerPropertiesProperty -> Maybe LogConfigurationProperty
memory :: ContainerPropertiesProperty -> Maybe (Value Integer)
mountPoints :: ContainerPropertiesProperty -> Maybe [MountPointProperty]
networkConfiguration :: ContainerPropertiesProperty -> Maybe NetworkConfigurationProperty
privileged :: ContainerPropertiesProperty -> Maybe (Value Bool)
readonlyRootFilesystem :: ContainerPropertiesProperty -> Maybe (Value Bool)
repositoryCredentials :: ContainerPropertiesProperty -> Maybe RepositoryCredentialsProperty
resourceRequirements :: ContainerPropertiesProperty -> Maybe [ResourceRequirementProperty]
runtimePlatform :: ContainerPropertiesProperty -> Maybe RuntimePlatformProperty
secrets :: ContainerPropertiesProperty -> Maybe [SecretProperty]
ulimits :: ContainerPropertiesProperty -> Maybe [UlimitProperty]
user :: ContainerPropertiesProperty -> Maybe (Value Text)
vcpus :: ContainerPropertiesProperty -> Maybe (Value Integer)
volumes :: ContainerPropertiesProperty -> Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
= ContainerPropertiesProperty
{networkConfiguration :: Maybe NetworkConfigurationProperty
networkConfiguration = NetworkConfigurationProperty -> Maybe NetworkConfigurationProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "NetworkConfiguration" ContainerPropertiesProperty
NetworkConfigurationProperty
newValue, Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
instance Property "Privileged" ContainerPropertiesProperty where
type PropertyType "Privileged" ContainerPropertiesProperty = Value Prelude.Bool
set :: PropertyType "Privileged" ContainerPropertiesProperty
-> ContainerPropertiesProperty -> ContainerPropertiesProperty
set PropertyType "Privileged" ContainerPropertiesProperty
newValue ContainerPropertiesProperty {Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ContainerPropertiesProperty -> ()
command :: ContainerPropertiesProperty -> Maybe (ValueList Text)
enableExecuteCommand :: ContainerPropertiesProperty -> Maybe (Value Bool)
environment :: ContainerPropertiesProperty -> Maybe [EnvironmentProperty]
ephemeralStorage :: ContainerPropertiesProperty -> Maybe EphemeralStorageProperty
executionRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
fargatePlatformConfiguration :: ContainerPropertiesProperty
-> Maybe FargatePlatformConfigurationProperty
image :: ContainerPropertiesProperty -> Value Text
jobRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
linuxParameters :: ContainerPropertiesProperty -> Maybe LinuxParametersProperty
logConfiguration :: ContainerPropertiesProperty -> Maybe LogConfigurationProperty
memory :: ContainerPropertiesProperty -> Maybe (Value Integer)
mountPoints :: ContainerPropertiesProperty -> Maybe [MountPointProperty]
networkConfiguration :: ContainerPropertiesProperty -> Maybe NetworkConfigurationProperty
privileged :: ContainerPropertiesProperty -> Maybe (Value Bool)
readonlyRootFilesystem :: ContainerPropertiesProperty -> Maybe (Value Bool)
repositoryCredentials :: ContainerPropertiesProperty -> Maybe RepositoryCredentialsProperty
resourceRequirements :: ContainerPropertiesProperty -> Maybe [ResourceRequirementProperty]
runtimePlatform :: ContainerPropertiesProperty -> Maybe RuntimePlatformProperty
secrets :: ContainerPropertiesProperty -> Maybe [SecretProperty]
ulimits :: ContainerPropertiesProperty -> Maybe [UlimitProperty]
user :: ContainerPropertiesProperty -> Maybe (Value Text)
vcpus :: ContainerPropertiesProperty -> Maybe (Value Integer)
volumes :: ContainerPropertiesProperty -> Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
= ContainerPropertiesProperty
{privileged :: Maybe (Value Bool)
privileged = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Privileged" ContainerPropertiesProperty
Value Bool
newValue, Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
instance Property "ReadonlyRootFilesystem" ContainerPropertiesProperty where
type PropertyType "ReadonlyRootFilesystem" ContainerPropertiesProperty = Value Prelude.Bool
set :: PropertyType "ReadonlyRootFilesystem" ContainerPropertiesProperty
-> ContainerPropertiesProperty -> ContainerPropertiesProperty
set PropertyType "ReadonlyRootFilesystem" ContainerPropertiesProperty
newValue ContainerPropertiesProperty {Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ContainerPropertiesProperty -> ()
command :: ContainerPropertiesProperty -> Maybe (ValueList Text)
enableExecuteCommand :: ContainerPropertiesProperty -> Maybe (Value Bool)
environment :: ContainerPropertiesProperty -> Maybe [EnvironmentProperty]
ephemeralStorage :: ContainerPropertiesProperty -> Maybe EphemeralStorageProperty
executionRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
fargatePlatformConfiguration :: ContainerPropertiesProperty
-> Maybe FargatePlatformConfigurationProperty
image :: ContainerPropertiesProperty -> Value Text
jobRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
linuxParameters :: ContainerPropertiesProperty -> Maybe LinuxParametersProperty
logConfiguration :: ContainerPropertiesProperty -> Maybe LogConfigurationProperty
memory :: ContainerPropertiesProperty -> Maybe (Value Integer)
mountPoints :: ContainerPropertiesProperty -> Maybe [MountPointProperty]
networkConfiguration :: ContainerPropertiesProperty -> Maybe NetworkConfigurationProperty
privileged :: ContainerPropertiesProperty -> Maybe (Value Bool)
readonlyRootFilesystem :: ContainerPropertiesProperty -> Maybe (Value Bool)
repositoryCredentials :: ContainerPropertiesProperty -> Maybe RepositoryCredentialsProperty
resourceRequirements :: ContainerPropertiesProperty -> Maybe [ResourceRequirementProperty]
runtimePlatform :: ContainerPropertiesProperty -> Maybe RuntimePlatformProperty
secrets :: ContainerPropertiesProperty -> Maybe [SecretProperty]
ulimits :: ContainerPropertiesProperty -> Maybe [UlimitProperty]
user :: ContainerPropertiesProperty -> Maybe (Value Text)
vcpus :: ContainerPropertiesProperty -> Maybe (Value Integer)
volumes :: ContainerPropertiesProperty -> Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
= ContainerPropertiesProperty
{readonlyRootFilesystem :: Maybe (Value Bool)
readonlyRootFilesystem = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "ReadonlyRootFilesystem" ContainerPropertiesProperty
Value Bool
newValue, Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
instance Property "RepositoryCredentials" ContainerPropertiesProperty where
type PropertyType "RepositoryCredentials" ContainerPropertiesProperty = RepositoryCredentialsProperty
set :: PropertyType "RepositoryCredentials" ContainerPropertiesProperty
-> ContainerPropertiesProperty -> ContainerPropertiesProperty
set PropertyType "RepositoryCredentials" ContainerPropertiesProperty
newValue ContainerPropertiesProperty {Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ContainerPropertiesProperty -> ()
command :: ContainerPropertiesProperty -> Maybe (ValueList Text)
enableExecuteCommand :: ContainerPropertiesProperty -> Maybe (Value Bool)
environment :: ContainerPropertiesProperty -> Maybe [EnvironmentProperty]
ephemeralStorage :: ContainerPropertiesProperty -> Maybe EphemeralStorageProperty
executionRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
fargatePlatformConfiguration :: ContainerPropertiesProperty
-> Maybe FargatePlatformConfigurationProperty
image :: ContainerPropertiesProperty -> Value Text
jobRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
linuxParameters :: ContainerPropertiesProperty -> Maybe LinuxParametersProperty
logConfiguration :: ContainerPropertiesProperty -> Maybe LogConfigurationProperty
memory :: ContainerPropertiesProperty -> Maybe (Value Integer)
mountPoints :: ContainerPropertiesProperty -> Maybe [MountPointProperty]
networkConfiguration :: ContainerPropertiesProperty -> Maybe NetworkConfigurationProperty
privileged :: ContainerPropertiesProperty -> Maybe (Value Bool)
readonlyRootFilesystem :: ContainerPropertiesProperty -> Maybe (Value Bool)
repositoryCredentials :: ContainerPropertiesProperty -> Maybe RepositoryCredentialsProperty
resourceRequirements :: ContainerPropertiesProperty -> Maybe [ResourceRequirementProperty]
runtimePlatform :: ContainerPropertiesProperty -> Maybe RuntimePlatformProperty
secrets :: ContainerPropertiesProperty -> Maybe [SecretProperty]
ulimits :: ContainerPropertiesProperty -> Maybe [UlimitProperty]
user :: ContainerPropertiesProperty -> Maybe (Value Text)
vcpus :: ContainerPropertiesProperty -> Maybe (Value Integer)
volumes :: ContainerPropertiesProperty -> Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
= ContainerPropertiesProperty
{repositoryCredentials :: Maybe RepositoryCredentialsProperty
repositoryCredentials = RepositoryCredentialsProperty
-> Maybe RepositoryCredentialsProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "RepositoryCredentials" ContainerPropertiesProperty
RepositoryCredentialsProperty
newValue, Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
instance Property "ResourceRequirements" ContainerPropertiesProperty where
type PropertyType "ResourceRequirements" ContainerPropertiesProperty = [ResourceRequirementProperty]
set :: PropertyType "ResourceRequirements" ContainerPropertiesProperty
-> ContainerPropertiesProperty -> ContainerPropertiesProperty
set PropertyType "ResourceRequirements" ContainerPropertiesProperty
newValue ContainerPropertiesProperty {Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ContainerPropertiesProperty -> ()
command :: ContainerPropertiesProperty -> Maybe (ValueList Text)
enableExecuteCommand :: ContainerPropertiesProperty -> Maybe (Value Bool)
environment :: ContainerPropertiesProperty -> Maybe [EnvironmentProperty]
ephemeralStorage :: ContainerPropertiesProperty -> Maybe EphemeralStorageProperty
executionRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
fargatePlatformConfiguration :: ContainerPropertiesProperty
-> Maybe FargatePlatformConfigurationProperty
image :: ContainerPropertiesProperty -> Value Text
jobRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
linuxParameters :: ContainerPropertiesProperty -> Maybe LinuxParametersProperty
logConfiguration :: ContainerPropertiesProperty -> Maybe LogConfigurationProperty
memory :: ContainerPropertiesProperty -> Maybe (Value Integer)
mountPoints :: ContainerPropertiesProperty -> Maybe [MountPointProperty]
networkConfiguration :: ContainerPropertiesProperty -> Maybe NetworkConfigurationProperty
privileged :: ContainerPropertiesProperty -> Maybe (Value Bool)
readonlyRootFilesystem :: ContainerPropertiesProperty -> Maybe (Value Bool)
repositoryCredentials :: ContainerPropertiesProperty -> Maybe RepositoryCredentialsProperty
resourceRequirements :: ContainerPropertiesProperty -> Maybe [ResourceRequirementProperty]
runtimePlatform :: ContainerPropertiesProperty -> Maybe RuntimePlatformProperty
secrets :: ContainerPropertiesProperty -> Maybe [SecretProperty]
ulimits :: ContainerPropertiesProperty -> Maybe [UlimitProperty]
user :: ContainerPropertiesProperty -> Maybe (Value Text)
vcpus :: ContainerPropertiesProperty -> Maybe (Value Integer)
volumes :: ContainerPropertiesProperty -> Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
= ContainerPropertiesProperty
{resourceRequirements :: Maybe [ResourceRequirementProperty]
resourceRequirements = [ResourceRequirementProperty]
-> Maybe [ResourceRequirementProperty]
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure [ResourceRequirementProperty]
PropertyType "ResourceRequirements" ContainerPropertiesProperty
newValue, Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
instance Property "RuntimePlatform" ContainerPropertiesProperty where
type PropertyType "RuntimePlatform" ContainerPropertiesProperty = RuntimePlatformProperty
set :: PropertyType "RuntimePlatform" ContainerPropertiesProperty
-> ContainerPropertiesProperty -> ContainerPropertiesProperty
set PropertyType "RuntimePlatform" ContainerPropertiesProperty
newValue ContainerPropertiesProperty {Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ContainerPropertiesProperty -> ()
command :: ContainerPropertiesProperty -> Maybe (ValueList Text)
enableExecuteCommand :: ContainerPropertiesProperty -> Maybe (Value Bool)
environment :: ContainerPropertiesProperty -> Maybe [EnvironmentProperty]
ephemeralStorage :: ContainerPropertiesProperty -> Maybe EphemeralStorageProperty
executionRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
fargatePlatformConfiguration :: ContainerPropertiesProperty
-> Maybe FargatePlatformConfigurationProperty
image :: ContainerPropertiesProperty -> Value Text
jobRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
linuxParameters :: ContainerPropertiesProperty -> Maybe LinuxParametersProperty
logConfiguration :: ContainerPropertiesProperty -> Maybe LogConfigurationProperty
memory :: ContainerPropertiesProperty -> Maybe (Value Integer)
mountPoints :: ContainerPropertiesProperty -> Maybe [MountPointProperty]
networkConfiguration :: ContainerPropertiesProperty -> Maybe NetworkConfigurationProperty
privileged :: ContainerPropertiesProperty -> Maybe (Value Bool)
readonlyRootFilesystem :: ContainerPropertiesProperty -> Maybe (Value Bool)
repositoryCredentials :: ContainerPropertiesProperty -> Maybe RepositoryCredentialsProperty
resourceRequirements :: ContainerPropertiesProperty -> Maybe [ResourceRequirementProperty]
runtimePlatform :: ContainerPropertiesProperty -> Maybe RuntimePlatformProperty
secrets :: ContainerPropertiesProperty -> Maybe [SecretProperty]
ulimits :: ContainerPropertiesProperty -> Maybe [UlimitProperty]
user :: ContainerPropertiesProperty -> Maybe (Value Text)
vcpus :: ContainerPropertiesProperty -> Maybe (Value Integer)
volumes :: ContainerPropertiesProperty -> Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
= ContainerPropertiesProperty
{runtimePlatform :: Maybe RuntimePlatformProperty
runtimePlatform = RuntimePlatformProperty -> Maybe RuntimePlatformProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "RuntimePlatform" ContainerPropertiesProperty
RuntimePlatformProperty
newValue, Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
instance Property "Secrets" ContainerPropertiesProperty where
type PropertyType "Secrets" ContainerPropertiesProperty = [SecretProperty]
set :: PropertyType "Secrets" ContainerPropertiesProperty
-> ContainerPropertiesProperty -> ContainerPropertiesProperty
set PropertyType "Secrets" ContainerPropertiesProperty
newValue ContainerPropertiesProperty {Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ContainerPropertiesProperty -> ()
command :: ContainerPropertiesProperty -> Maybe (ValueList Text)
enableExecuteCommand :: ContainerPropertiesProperty -> Maybe (Value Bool)
environment :: ContainerPropertiesProperty -> Maybe [EnvironmentProperty]
ephemeralStorage :: ContainerPropertiesProperty -> Maybe EphemeralStorageProperty
executionRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
fargatePlatformConfiguration :: ContainerPropertiesProperty
-> Maybe FargatePlatformConfigurationProperty
image :: ContainerPropertiesProperty -> Value Text
jobRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
linuxParameters :: ContainerPropertiesProperty -> Maybe LinuxParametersProperty
logConfiguration :: ContainerPropertiesProperty -> Maybe LogConfigurationProperty
memory :: ContainerPropertiesProperty -> Maybe (Value Integer)
mountPoints :: ContainerPropertiesProperty -> Maybe [MountPointProperty]
networkConfiguration :: ContainerPropertiesProperty -> Maybe NetworkConfigurationProperty
privileged :: ContainerPropertiesProperty -> Maybe (Value Bool)
readonlyRootFilesystem :: ContainerPropertiesProperty -> Maybe (Value Bool)
repositoryCredentials :: ContainerPropertiesProperty -> Maybe RepositoryCredentialsProperty
resourceRequirements :: ContainerPropertiesProperty -> Maybe [ResourceRequirementProperty]
runtimePlatform :: ContainerPropertiesProperty -> Maybe RuntimePlatformProperty
secrets :: ContainerPropertiesProperty -> Maybe [SecretProperty]
ulimits :: ContainerPropertiesProperty -> Maybe [UlimitProperty]
user :: ContainerPropertiesProperty -> Maybe (Value Text)
vcpus :: ContainerPropertiesProperty -> Maybe (Value Integer)
volumes :: ContainerPropertiesProperty -> Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
= ContainerPropertiesProperty {secrets :: Maybe [SecretProperty]
secrets = [SecretProperty] -> Maybe [SecretProperty]
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure [SecretProperty]
PropertyType "Secrets" ContainerPropertiesProperty
newValue, Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
instance Property "Ulimits" ContainerPropertiesProperty where
type PropertyType "Ulimits" ContainerPropertiesProperty = [UlimitProperty]
set :: PropertyType "Ulimits" ContainerPropertiesProperty
-> ContainerPropertiesProperty -> ContainerPropertiesProperty
set PropertyType "Ulimits" ContainerPropertiesProperty
newValue ContainerPropertiesProperty {Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ContainerPropertiesProperty -> ()
command :: ContainerPropertiesProperty -> Maybe (ValueList Text)
enableExecuteCommand :: ContainerPropertiesProperty -> Maybe (Value Bool)
environment :: ContainerPropertiesProperty -> Maybe [EnvironmentProperty]
ephemeralStorage :: ContainerPropertiesProperty -> Maybe EphemeralStorageProperty
executionRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
fargatePlatformConfiguration :: ContainerPropertiesProperty
-> Maybe FargatePlatformConfigurationProperty
image :: ContainerPropertiesProperty -> Value Text
jobRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
linuxParameters :: ContainerPropertiesProperty -> Maybe LinuxParametersProperty
logConfiguration :: ContainerPropertiesProperty -> Maybe LogConfigurationProperty
memory :: ContainerPropertiesProperty -> Maybe (Value Integer)
mountPoints :: ContainerPropertiesProperty -> Maybe [MountPointProperty]
networkConfiguration :: ContainerPropertiesProperty -> Maybe NetworkConfigurationProperty
privileged :: ContainerPropertiesProperty -> Maybe (Value Bool)
readonlyRootFilesystem :: ContainerPropertiesProperty -> Maybe (Value Bool)
repositoryCredentials :: ContainerPropertiesProperty -> Maybe RepositoryCredentialsProperty
resourceRequirements :: ContainerPropertiesProperty -> Maybe [ResourceRequirementProperty]
runtimePlatform :: ContainerPropertiesProperty -> Maybe RuntimePlatformProperty
secrets :: ContainerPropertiesProperty -> Maybe [SecretProperty]
ulimits :: ContainerPropertiesProperty -> Maybe [UlimitProperty]
user :: ContainerPropertiesProperty -> Maybe (Value Text)
vcpus :: ContainerPropertiesProperty -> Maybe (Value Integer)
volumes :: ContainerPropertiesProperty -> Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
= ContainerPropertiesProperty {ulimits :: Maybe [UlimitProperty]
ulimits = [UlimitProperty] -> Maybe [UlimitProperty]
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure [UlimitProperty]
PropertyType "Ulimits" ContainerPropertiesProperty
newValue, Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
instance Property "User" ContainerPropertiesProperty where
type PropertyType "User" ContainerPropertiesProperty = Value Prelude.Text
set :: PropertyType "User" ContainerPropertiesProperty
-> ContainerPropertiesProperty -> ContainerPropertiesProperty
set PropertyType "User" ContainerPropertiesProperty
newValue ContainerPropertiesProperty {Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ContainerPropertiesProperty -> ()
command :: ContainerPropertiesProperty -> Maybe (ValueList Text)
enableExecuteCommand :: ContainerPropertiesProperty -> Maybe (Value Bool)
environment :: ContainerPropertiesProperty -> Maybe [EnvironmentProperty]
ephemeralStorage :: ContainerPropertiesProperty -> Maybe EphemeralStorageProperty
executionRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
fargatePlatformConfiguration :: ContainerPropertiesProperty
-> Maybe FargatePlatformConfigurationProperty
image :: ContainerPropertiesProperty -> Value Text
jobRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
linuxParameters :: ContainerPropertiesProperty -> Maybe LinuxParametersProperty
logConfiguration :: ContainerPropertiesProperty -> Maybe LogConfigurationProperty
memory :: ContainerPropertiesProperty -> Maybe (Value Integer)
mountPoints :: ContainerPropertiesProperty -> Maybe [MountPointProperty]
networkConfiguration :: ContainerPropertiesProperty -> Maybe NetworkConfigurationProperty
privileged :: ContainerPropertiesProperty -> Maybe (Value Bool)
readonlyRootFilesystem :: ContainerPropertiesProperty -> Maybe (Value Bool)
repositoryCredentials :: ContainerPropertiesProperty -> Maybe RepositoryCredentialsProperty
resourceRequirements :: ContainerPropertiesProperty -> Maybe [ResourceRequirementProperty]
runtimePlatform :: ContainerPropertiesProperty -> Maybe RuntimePlatformProperty
secrets :: ContainerPropertiesProperty -> Maybe [SecretProperty]
ulimits :: ContainerPropertiesProperty -> Maybe [UlimitProperty]
user :: ContainerPropertiesProperty -> Maybe (Value Text)
vcpus :: ContainerPropertiesProperty -> Maybe (Value Integer)
volumes :: ContainerPropertiesProperty -> Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
= ContainerPropertiesProperty {user :: Maybe (Value Text)
user = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "User" ContainerPropertiesProperty
Value Text
newValue, Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
instance Property "Vcpus" ContainerPropertiesProperty where
type PropertyType "Vcpus" ContainerPropertiesProperty = Value Prelude.Integer
set :: PropertyType "Vcpus" ContainerPropertiesProperty
-> ContainerPropertiesProperty -> ContainerPropertiesProperty
set PropertyType "Vcpus" ContainerPropertiesProperty
newValue ContainerPropertiesProperty {Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ContainerPropertiesProperty -> ()
command :: ContainerPropertiesProperty -> Maybe (ValueList Text)
enableExecuteCommand :: ContainerPropertiesProperty -> Maybe (Value Bool)
environment :: ContainerPropertiesProperty -> Maybe [EnvironmentProperty]
ephemeralStorage :: ContainerPropertiesProperty -> Maybe EphemeralStorageProperty
executionRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
fargatePlatformConfiguration :: ContainerPropertiesProperty
-> Maybe FargatePlatformConfigurationProperty
image :: ContainerPropertiesProperty -> Value Text
jobRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
linuxParameters :: ContainerPropertiesProperty -> Maybe LinuxParametersProperty
logConfiguration :: ContainerPropertiesProperty -> Maybe LogConfigurationProperty
memory :: ContainerPropertiesProperty -> Maybe (Value Integer)
mountPoints :: ContainerPropertiesProperty -> Maybe [MountPointProperty]
networkConfiguration :: ContainerPropertiesProperty -> Maybe NetworkConfigurationProperty
privileged :: ContainerPropertiesProperty -> Maybe (Value Bool)
readonlyRootFilesystem :: ContainerPropertiesProperty -> Maybe (Value Bool)
repositoryCredentials :: ContainerPropertiesProperty -> Maybe RepositoryCredentialsProperty
resourceRequirements :: ContainerPropertiesProperty -> Maybe [ResourceRequirementProperty]
runtimePlatform :: ContainerPropertiesProperty -> Maybe RuntimePlatformProperty
secrets :: ContainerPropertiesProperty -> Maybe [SecretProperty]
ulimits :: ContainerPropertiesProperty -> Maybe [UlimitProperty]
user :: ContainerPropertiesProperty -> Maybe (Value Text)
vcpus :: ContainerPropertiesProperty -> Maybe (Value Integer)
volumes :: ContainerPropertiesProperty -> Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
= ContainerPropertiesProperty {vcpus :: Maybe (Value Integer)
vcpus = Value Integer -> Maybe (Value Integer)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Vcpus" ContainerPropertiesProperty
Value Integer
newValue, Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
volumes :: Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
volumes :: Maybe [VolumeProperty]
..}
instance Property "Volumes" ContainerPropertiesProperty where
type PropertyType "Volumes" ContainerPropertiesProperty = [VolumeProperty]
set :: PropertyType "Volumes" ContainerPropertiesProperty
-> ContainerPropertiesProperty -> ContainerPropertiesProperty
set PropertyType "Volumes" ContainerPropertiesProperty
newValue ContainerPropertiesProperty {Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe [VolumeProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ContainerPropertiesProperty -> ()
command :: ContainerPropertiesProperty -> Maybe (ValueList Text)
enableExecuteCommand :: ContainerPropertiesProperty -> Maybe (Value Bool)
environment :: ContainerPropertiesProperty -> Maybe [EnvironmentProperty]
ephemeralStorage :: ContainerPropertiesProperty -> Maybe EphemeralStorageProperty
executionRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
fargatePlatformConfiguration :: ContainerPropertiesProperty
-> Maybe FargatePlatformConfigurationProperty
image :: ContainerPropertiesProperty -> Value Text
jobRoleArn :: ContainerPropertiesProperty -> Maybe (Value Text)
linuxParameters :: ContainerPropertiesProperty -> Maybe LinuxParametersProperty
logConfiguration :: ContainerPropertiesProperty -> Maybe LogConfigurationProperty
memory :: ContainerPropertiesProperty -> Maybe (Value Integer)
mountPoints :: ContainerPropertiesProperty -> Maybe [MountPointProperty]
networkConfiguration :: ContainerPropertiesProperty -> Maybe NetworkConfigurationProperty
privileged :: ContainerPropertiesProperty -> Maybe (Value Bool)
readonlyRootFilesystem :: ContainerPropertiesProperty -> Maybe (Value Bool)
repositoryCredentials :: ContainerPropertiesProperty -> Maybe RepositoryCredentialsProperty
resourceRequirements :: ContainerPropertiesProperty -> Maybe [ResourceRequirementProperty]
runtimePlatform :: ContainerPropertiesProperty -> Maybe RuntimePlatformProperty
secrets :: ContainerPropertiesProperty -> Maybe [SecretProperty]
ulimits :: ContainerPropertiesProperty -> Maybe [UlimitProperty]
user :: ContainerPropertiesProperty -> Maybe (Value Text)
vcpus :: ContainerPropertiesProperty -> Maybe (Value Integer)
volumes :: ContainerPropertiesProperty -> Maybe [VolumeProperty]
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
volumes :: Maybe [VolumeProperty]
..}
= ContainerPropertiesProperty {volumes :: Maybe [VolumeProperty]
volumes = [VolumeProperty] -> Maybe [VolumeProperty]
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure [VolumeProperty]
PropertyType "Volumes" ContainerPropertiesProperty
newValue, Maybe [EnvironmentProperty]
Maybe [MountPointProperty]
Maybe [ResourceRequirementProperty]
Maybe [SecretProperty]
Maybe [UlimitProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe EphemeralStorageProperty
Maybe FargatePlatformConfigurationProperty
Maybe NetworkConfigurationProperty
Maybe RepositoryCredentialsProperty
Maybe RuntimePlatformProperty
Maybe LogConfigurationProperty
Maybe LinuxParametersProperty
()
Value Text
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
haddock_workaround_ :: ()
command :: Maybe (ValueList Text)
enableExecuteCommand :: Maybe (Value Bool)
environment :: Maybe [EnvironmentProperty]
ephemeralStorage :: Maybe EphemeralStorageProperty
executionRoleArn :: Maybe (Value Text)
fargatePlatformConfiguration :: Maybe FargatePlatformConfigurationProperty
image :: Value Text
jobRoleArn :: Maybe (Value Text)
linuxParameters :: Maybe LinuxParametersProperty
logConfiguration :: Maybe LogConfigurationProperty
memory :: Maybe (Value Integer)
mountPoints :: Maybe [MountPointProperty]
networkConfiguration :: Maybe NetworkConfigurationProperty
privileged :: Maybe (Value Bool)
readonlyRootFilesystem :: Maybe (Value Bool)
repositoryCredentials :: Maybe RepositoryCredentialsProperty
resourceRequirements :: Maybe [ResourceRequirementProperty]
runtimePlatform :: Maybe RuntimePlatformProperty
secrets :: Maybe [SecretProperty]
ulimits :: Maybe [UlimitProperty]
user :: Maybe (Value Text)
vcpus :: Maybe (Value Integer)
..}