{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE DuplicateRecordFields #-}
{-# LANGUAGE NamedFieldPuns #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE RecordWildCards #-}
{-# LANGUAGE StrictData #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
{-# OPTIONS_GHC -fno-warn-unused-matches #-}
module Amazonka.ECS.Types.TaskDefinition where
import qualified Amazonka.Core as Core
import Amazonka.ECS.Types.Attribute
import Amazonka.ECS.Types.Compatibility
import Amazonka.ECS.Types.ContainerDefinition
import Amazonka.ECS.Types.EphemeralStorage
import Amazonka.ECS.Types.InferenceAccelerator
import Amazonka.ECS.Types.IpcMode
import Amazonka.ECS.Types.NetworkMode
import Amazonka.ECS.Types.PidMode
import Amazonka.ECS.Types.ProxyConfiguration
import Amazonka.ECS.Types.TaskDefinitionPlacementConstraint
import Amazonka.ECS.Types.TaskDefinitionStatus
import Amazonka.ECS.Types.Volume
import qualified Amazonka.Lens as Lens
import qualified Amazonka.Prelude as Prelude
data TaskDefinition = TaskDefinition'
{
TaskDefinition -> Maybe TaskDefinitionStatus
status :: Prelude.Maybe TaskDefinitionStatus,
TaskDefinition -> Maybe [InferenceAccelerator]
inferenceAccelerators :: Prelude.Maybe [InferenceAccelerator],
TaskDefinition -> Maybe Text
executionRoleArn :: Prelude.Maybe Prelude.Text,
TaskDefinition -> Maybe [Compatibility]
requiresCompatibilities :: Prelude.Maybe [Compatibility],
TaskDefinition -> Maybe EphemeralStorage
ephemeralStorage :: Prelude.Maybe EphemeralStorage,
TaskDefinition -> Maybe PidMode
pidMode :: Prelude.Maybe PidMode,
TaskDefinition -> Maybe Text
family :: Prelude.Maybe Prelude.Text,
TaskDefinition -> Maybe IpcMode
ipcMode :: Prelude.Maybe IpcMode,
TaskDefinition -> Maybe [ContainerDefinition]
containerDefinitions :: Prelude.Maybe [ContainerDefinition],
TaskDefinition -> Maybe Text
memory :: Prelude.Maybe Prelude.Text,
TaskDefinition -> Maybe ProxyConfiguration
proxyConfiguration :: Prelude.Maybe ProxyConfiguration,
TaskDefinition -> Maybe Text
taskRoleArn :: Prelude.Maybe Prelude.Text,
TaskDefinition -> Maybe POSIX
deregisteredAt :: Prelude.Maybe Core.POSIX,
TaskDefinition -> Maybe [TaskDefinitionPlacementConstraint]
placementConstraints :: Prelude.Maybe [TaskDefinitionPlacementConstraint],
TaskDefinition -> Maybe POSIX
registeredAt :: Prelude.Maybe Core.POSIX,
TaskDefinition -> Maybe NetworkMode
networkMode :: Prelude.Maybe NetworkMode,
TaskDefinition -> Maybe Text
taskDefinitionArn :: Prelude.Maybe Prelude.Text,
TaskDefinition -> Maybe [Compatibility]
compatibilities :: Prelude.Maybe [Compatibility],
TaskDefinition -> Maybe Text
registeredBy :: Prelude.Maybe Prelude.Text,
TaskDefinition -> Maybe Int
revision :: Prelude.Maybe Prelude.Int,
TaskDefinition -> Maybe [Volume]
volumes :: Prelude.Maybe [Volume],
TaskDefinition -> Maybe Text
cpu :: Prelude.Maybe Prelude.Text,
TaskDefinition -> Maybe [Attribute]
requiresAttributes :: Prelude.Maybe [Attribute]
}
deriving (TaskDefinition -> TaskDefinition -> Bool
(TaskDefinition -> TaskDefinition -> Bool)
-> (TaskDefinition -> TaskDefinition -> Bool) -> Eq TaskDefinition
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: TaskDefinition -> TaskDefinition -> Bool
$c/= :: TaskDefinition -> TaskDefinition -> Bool
== :: TaskDefinition -> TaskDefinition -> Bool
$c== :: TaskDefinition -> TaskDefinition -> Bool
Prelude.Eq, ReadPrec [TaskDefinition]
ReadPrec TaskDefinition
Int -> ReadS TaskDefinition
ReadS [TaskDefinition]
(Int -> ReadS TaskDefinition)
-> ReadS [TaskDefinition]
-> ReadPrec TaskDefinition
-> ReadPrec [TaskDefinition]
-> Read TaskDefinition
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [TaskDefinition]
$creadListPrec :: ReadPrec [TaskDefinition]
readPrec :: ReadPrec TaskDefinition
$creadPrec :: ReadPrec TaskDefinition
readList :: ReadS [TaskDefinition]
$creadList :: ReadS [TaskDefinition]
readsPrec :: Int -> ReadS TaskDefinition
$creadsPrec :: Int -> ReadS TaskDefinition
Prelude.Read, Int -> TaskDefinition -> ShowS
[TaskDefinition] -> ShowS
TaskDefinition -> String
(Int -> TaskDefinition -> ShowS)
-> (TaskDefinition -> String)
-> ([TaskDefinition] -> ShowS)
-> Show TaskDefinition
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [TaskDefinition] -> ShowS
$cshowList :: [TaskDefinition] -> ShowS
show :: TaskDefinition -> String
$cshow :: TaskDefinition -> String
showsPrec :: Int -> TaskDefinition -> ShowS
$cshowsPrec :: Int -> TaskDefinition -> ShowS
Prelude.Show, (forall x. TaskDefinition -> Rep TaskDefinition x)
-> (forall x. Rep TaskDefinition x -> TaskDefinition)
-> Generic TaskDefinition
forall x. Rep TaskDefinition x -> TaskDefinition
forall x. TaskDefinition -> Rep TaskDefinition x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep TaskDefinition x -> TaskDefinition
$cfrom :: forall x. TaskDefinition -> Rep TaskDefinition x
Prelude.Generic)
newTaskDefinition ::
TaskDefinition
newTaskDefinition :: TaskDefinition
newTaskDefinition =
TaskDefinition' :: Maybe TaskDefinitionStatus
-> Maybe [InferenceAccelerator]
-> Maybe Text
-> Maybe [Compatibility]
-> Maybe EphemeralStorage
-> Maybe PidMode
-> Maybe Text
-> Maybe IpcMode
-> Maybe [ContainerDefinition]
-> Maybe Text
-> Maybe ProxyConfiguration
-> Maybe Text
-> Maybe POSIX
-> Maybe [TaskDefinitionPlacementConstraint]
-> Maybe POSIX
-> Maybe NetworkMode
-> Maybe Text
-> Maybe [Compatibility]
-> Maybe Text
-> Maybe Int
-> Maybe [Volume]
-> Maybe Text
-> Maybe [Attribute]
-> TaskDefinition
TaskDefinition'
{ $sel:status:TaskDefinition' :: Maybe TaskDefinitionStatus
status = Maybe TaskDefinitionStatus
forall a. Maybe a
Prelude.Nothing,
$sel:inferenceAccelerators:TaskDefinition' :: Maybe [InferenceAccelerator]
inferenceAccelerators = Maybe [InferenceAccelerator]
forall a. Maybe a
Prelude.Nothing,
$sel:executionRoleArn:TaskDefinition' :: Maybe Text
executionRoleArn = Maybe Text
forall a. Maybe a
Prelude.Nothing,
$sel:requiresCompatibilities:TaskDefinition' :: Maybe [Compatibility]
requiresCompatibilities = Maybe [Compatibility]
forall a. Maybe a
Prelude.Nothing,
$sel:ephemeralStorage:TaskDefinition' :: Maybe EphemeralStorage
ephemeralStorage = Maybe EphemeralStorage
forall a. Maybe a
Prelude.Nothing,
$sel:pidMode:TaskDefinition' :: Maybe PidMode
pidMode = Maybe PidMode
forall a. Maybe a
Prelude.Nothing,
$sel:family:TaskDefinition' :: Maybe Text
family = Maybe Text
forall a. Maybe a
Prelude.Nothing,
$sel:ipcMode:TaskDefinition' :: Maybe IpcMode
ipcMode = Maybe IpcMode
forall a. Maybe a
Prelude.Nothing,
$sel:containerDefinitions:TaskDefinition' :: Maybe [ContainerDefinition]
containerDefinitions = Maybe [ContainerDefinition]
forall a. Maybe a
Prelude.Nothing,
$sel:memory:TaskDefinition' :: Maybe Text
memory = Maybe Text
forall a. Maybe a
Prelude.Nothing,
$sel:proxyConfiguration:TaskDefinition' :: Maybe ProxyConfiguration
proxyConfiguration = Maybe ProxyConfiguration
forall a. Maybe a
Prelude.Nothing,
$sel:taskRoleArn:TaskDefinition' :: Maybe Text
taskRoleArn = Maybe Text
forall a. Maybe a
Prelude.Nothing,
$sel:deregisteredAt:TaskDefinition' :: Maybe POSIX
deregisteredAt = Maybe POSIX
forall a. Maybe a
Prelude.Nothing,
$sel:placementConstraints:TaskDefinition' :: Maybe [TaskDefinitionPlacementConstraint]
placementConstraints = Maybe [TaskDefinitionPlacementConstraint]
forall a. Maybe a
Prelude.Nothing,
$sel:registeredAt:TaskDefinition' :: Maybe POSIX
registeredAt = Maybe POSIX
forall a. Maybe a
Prelude.Nothing,
$sel:networkMode:TaskDefinition' :: Maybe NetworkMode
networkMode = Maybe NetworkMode
forall a. Maybe a
Prelude.Nothing,
$sel:taskDefinitionArn:TaskDefinition' :: Maybe Text
taskDefinitionArn = Maybe Text
forall a. Maybe a
Prelude.Nothing,
$sel:compatibilities:TaskDefinition' :: Maybe [Compatibility]
compatibilities = Maybe [Compatibility]
forall a. Maybe a
Prelude.Nothing,
$sel:registeredBy:TaskDefinition' :: Maybe Text
registeredBy = Maybe Text
forall a. Maybe a
Prelude.Nothing,
$sel:revision:TaskDefinition' :: Maybe Int
revision = Maybe Int
forall a. Maybe a
Prelude.Nothing,
$sel:volumes:TaskDefinition' :: Maybe [Volume]
volumes = Maybe [Volume]
forall a. Maybe a
Prelude.Nothing,
$sel:cpu:TaskDefinition' :: Maybe Text
cpu = Maybe Text
forall a. Maybe a
Prelude.Nothing,
$sel:requiresAttributes:TaskDefinition' :: Maybe [Attribute]
requiresAttributes = Maybe [Attribute]
forall a. Maybe a
Prelude.Nothing
}
taskDefinition_status :: Lens.Lens' TaskDefinition (Prelude.Maybe TaskDefinitionStatus)
taskDefinition_status :: (Maybe TaskDefinitionStatus -> f (Maybe TaskDefinitionStatus))
-> TaskDefinition -> f TaskDefinition
taskDefinition_status = (TaskDefinition -> Maybe TaskDefinitionStatus)
-> (TaskDefinition -> Maybe TaskDefinitionStatus -> TaskDefinition)
-> Lens
TaskDefinition
TaskDefinition
(Maybe TaskDefinitionStatus)
(Maybe TaskDefinitionStatus)
forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TaskDefinition' {Maybe TaskDefinitionStatus
status :: Maybe TaskDefinitionStatus
$sel:status:TaskDefinition' :: TaskDefinition -> Maybe TaskDefinitionStatus
status} -> Maybe TaskDefinitionStatus
status) (\s :: TaskDefinition
s@TaskDefinition' {} Maybe TaskDefinitionStatus
a -> TaskDefinition
s {$sel:status:TaskDefinition' :: Maybe TaskDefinitionStatus
status = Maybe TaskDefinitionStatus
a} :: TaskDefinition)
taskDefinition_inferenceAccelerators :: Lens.Lens' TaskDefinition (Prelude.Maybe [InferenceAccelerator])
taskDefinition_inferenceAccelerators :: (Maybe [InferenceAccelerator] -> f (Maybe [InferenceAccelerator]))
-> TaskDefinition -> f TaskDefinition
taskDefinition_inferenceAccelerators = (TaskDefinition -> Maybe [InferenceAccelerator])
-> (TaskDefinition
-> Maybe [InferenceAccelerator] -> TaskDefinition)
-> Lens
TaskDefinition
TaskDefinition
(Maybe [InferenceAccelerator])
(Maybe [InferenceAccelerator])
forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TaskDefinition' {Maybe [InferenceAccelerator]
inferenceAccelerators :: Maybe [InferenceAccelerator]
$sel:inferenceAccelerators:TaskDefinition' :: TaskDefinition -> Maybe [InferenceAccelerator]
inferenceAccelerators} -> Maybe [InferenceAccelerator]
inferenceAccelerators) (\s :: TaskDefinition
s@TaskDefinition' {} Maybe [InferenceAccelerator]
a -> TaskDefinition
s {$sel:inferenceAccelerators:TaskDefinition' :: Maybe [InferenceAccelerator]
inferenceAccelerators = Maybe [InferenceAccelerator]
a} :: TaskDefinition) ((Maybe [InferenceAccelerator] -> f (Maybe [InferenceAccelerator]))
-> TaskDefinition -> f TaskDefinition)
-> ((Maybe [InferenceAccelerator]
-> f (Maybe [InferenceAccelerator]))
-> Maybe [InferenceAccelerator]
-> f (Maybe [InferenceAccelerator]))
-> (Maybe [InferenceAccelerator]
-> f (Maybe [InferenceAccelerator]))
-> TaskDefinition
-> f TaskDefinition
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. AnIso
[InferenceAccelerator]
[InferenceAccelerator]
[InferenceAccelerator]
[InferenceAccelerator]
-> Iso
(Maybe [InferenceAccelerator])
(Maybe [InferenceAccelerator])
(Maybe [InferenceAccelerator])
(Maybe [InferenceAccelerator])
forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping AnIso
[InferenceAccelerator]
[InferenceAccelerator]
[InferenceAccelerator]
[InferenceAccelerator]
forall s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced
taskDefinition_executionRoleArn :: Lens.Lens' TaskDefinition (Prelude.Maybe Prelude.Text)
taskDefinition_executionRoleArn :: (Maybe Text -> f (Maybe Text))
-> TaskDefinition -> f TaskDefinition
taskDefinition_executionRoleArn = (TaskDefinition -> Maybe Text)
-> (TaskDefinition -> Maybe Text -> TaskDefinition)
-> Lens TaskDefinition TaskDefinition (Maybe Text) (Maybe Text)
forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TaskDefinition' {Maybe Text
executionRoleArn :: Maybe Text
$sel:executionRoleArn:TaskDefinition' :: TaskDefinition -> Maybe Text
executionRoleArn} -> Maybe Text
executionRoleArn) (\s :: TaskDefinition
s@TaskDefinition' {} Maybe Text
a -> TaskDefinition
s {$sel:executionRoleArn:TaskDefinition' :: Maybe Text
executionRoleArn = Maybe Text
a} :: TaskDefinition)
taskDefinition_requiresCompatibilities :: Lens.Lens' TaskDefinition (Prelude.Maybe [Compatibility])
taskDefinition_requiresCompatibilities :: (Maybe [Compatibility] -> f (Maybe [Compatibility]))
-> TaskDefinition -> f TaskDefinition
taskDefinition_requiresCompatibilities = (TaskDefinition -> Maybe [Compatibility])
-> (TaskDefinition -> Maybe [Compatibility] -> TaskDefinition)
-> Lens
TaskDefinition
TaskDefinition
(Maybe [Compatibility])
(Maybe [Compatibility])
forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TaskDefinition' {Maybe [Compatibility]
requiresCompatibilities :: Maybe [Compatibility]
$sel:requiresCompatibilities:TaskDefinition' :: TaskDefinition -> Maybe [Compatibility]
requiresCompatibilities} -> Maybe [Compatibility]
requiresCompatibilities) (\s :: TaskDefinition
s@TaskDefinition' {} Maybe [Compatibility]
a -> TaskDefinition
s {$sel:requiresCompatibilities:TaskDefinition' :: Maybe [Compatibility]
requiresCompatibilities = Maybe [Compatibility]
a} :: TaskDefinition) ((Maybe [Compatibility] -> f (Maybe [Compatibility]))
-> TaskDefinition -> f TaskDefinition)
-> ((Maybe [Compatibility] -> f (Maybe [Compatibility]))
-> Maybe [Compatibility] -> f (Maybe [Compatibility]))
-> (Maybe [Compatibility] -> f (Maybe [Compatibility]))
-> TaskDefinition
-> f TaskDefinition
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. AnIso
[Compatibility] [Compatibility] [Compatibility] [Compatibility]
-> Iso
(Maybe [Compatibility])
(Maybe [Compatibility])
(Maybe [Compatibility])
(Maybe [Compatibility])
forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping AnIso
[Compatibility] [Compatibility] [Compatibility] [Compatibility]
forall s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced
taskDefinition_ephemeralStorage :: Lens.Lens' TaskDefinition (Prelude.Maybe EphemeralStorage)
taskDefinition_ephemeralStorage :: (Maybe EphemeralStorage -> f (Maybe EphemeralStorage))
-> TaskDefinition -> f TaskDefinition
taskDefinition_ephemeralStorage = (TaskDefinition -> Maybe EphemeralStorage)
-> (TaskDefinition -> Maybe EphemeralStorage -> TaskDefinition)
-> Lens
TaskDefinition
TaskDefinition
(Maybe EphemeralStorage)
(Maybe EphemeralStorage)
forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TaskDefinition' {Maybe EphemeralStorage
ephemeralStorage :: Maybe EphemeralStorage
$sel:ephemeralStorage:TaskDefinition' :: TaskDefinition -> Maybe EphemeralStorage
ephemeralStorage} -> Maybe EphemeralStorage
ephemeralStorage) (\s :: TaskDefinition
s@TaskDefinition' {} Maybe EphemeralStorage
a -> TaskDefinition
s {$sel:ephemeralStorage:TaskDefinition' :: Maybe EphemeralStorage
ephemeralStorage = Maybe EphemeralStorage
a} :: TaskDefinition)
taskDefinition_pidMode :: Lens.Lens' TaskDefinition (Prelude.Maybe PidMode)
taskDefinition_pidMode :: (Maybe PidMode -> f (Maybe PidMode))
-> TaskDefinition -> f TaskDefinition
taskDefinition_pidMode = (TaskDefinition -> Maybe PidMode)
-> (TaskDefinition -> Maybe PidMode -> TaskDefinition)
-> Lens
TaskDefinition TaskDefinition (Maybe PidMode) (Maybe PidMode)
forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TaskDefinition' {Maybe PidMode
pidMode :: Maybe PidMode
$sel:pidMode:TaskDefinition' :: TaskDefinition -> Maybe PidMode
pidMode} -> Maybe PidMode
pidMode) (\s :: TaskDefinition
s@TaskDefinition' {} Maybe PidMode
a -> TaskDefinition
s {$sel:pidMode:TaskDefinition' :: Maybe PidMode
pidMode = Maybe PidMode
a} :: TaskDefinition)
taskDefinition_family :: Lens.Lens' TaskDefinition (Prelude.Maybe Prelude.Text)
taskDefinition_family :: (Maybe Text -> f (Maybe Text))
-> TaskDefinition -> f TaskDefinition
taskDefinition_family = (TaskDefinition -> Maybe Text)
-> (TaskDefinition -> Maybe Text -> TaskDefinition)
-> Lens TaskDefinition TaskDefinition (Maybe Text) (Maybe Text)
forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TaskDefinition' {Maybe Text
family :: Maybe Text
$sel:family:TaskDefinition' :: TaskDefinition -> Maybe Text
family} -> Maybe Text
family) (\s :: TaskDefinition
s@TaskDefinition' {} Maybe Text
a -> TaskDefinition
s {$sel:family:TaskDefinition' :: Maybe Text
family = Maybe Text
a} :: TaskDefinition)
taskDefinition_ipcMode :: Lens.Lens' TaskDefinition (Prelude.Maybe IpcMode)
taskDefinition_ipcMode :: (Maybe IpcMode -> f (Maybe IpcMode))
-> TaskDefinition -> f TaskDefinition
taskDefinition_ipcMode = (TaskDefinition -> Maybe IpcMode)
-> (TaskDefinition -> Maybe IpcMode -> TaskDefinition)
-> Lens
TaskDefinition TaskDefinition (Maybe IpcMode) (Maybe IpcMode)
forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TaskDefinition' {Maybe IpcMode
ipcMode :: Maybe IpcMode
$sel:ipcMode:TaskDefinition' :: TaskDefinition -> Maybe IpcMode
ipcMode} -> Maybe IpcMode
ipcMode) (\s :: TaskDefinition
s@TaskDefinition' {} Maybe IpcMode
a -> TaskDefinition
s {$sel:ipcMode:TaskDefinition' :: Maybe IpcMode
ipcMode = Maybe IpcMode
a} :: TaskDefinition)
taskDefinition_containerDefinitions :: Lens.Lens' TaskDefinition (Prelude.Maybe [ContainerDefinition])
taskDefinition_containerDefinitions :: (Maybe [ContainerDefinition] -> f (Maybe [ContainerDefinition]))
-> TaskDefinition -> f TaskDefinition
taskDefinition_containerDefinitions = (TaskDefinition -> Maybe [ContainerDefinition])
-> (TaskDefinition
-> Maybe [ContainerDefinition] -> TaskDefinition)
-> Lens
TaskDefinition
TaskDefinition
(Maybe [ContainerDefinition])
(Maybe [ContainerDefinition])
forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TaskDefinition' {Maybe [ContainerDefinition]
containerDefinitions :: Maybe [ContainerDefinition]
$sel:containerDefinitions:TaskDefinition' :: TaskDefinition -> Maybe [ContainerDefinition]
containerDefinitions} -> Maybe [ContainerDefinition]
containerDefinitions) (\s :: TaskDefinition
s@TaskDefinition' {} Maybe [ContainerDefinition]
a -> TaskDefinition
s {$sel:containerDefinitions:TaskDefinition' :: Maybe [ContainerDefinition]
containerDefinitions = Maybe [ContainerDefinition]
a} :: TaskDefinition) ((Maybe [ContainerDefinition] -> f (Maybe [ContainerDefinition]))
-> TaskDefinition -> f TaskDefinition)
-> ((Maybe [ContainerDefinition]
-> f (Maybe [ContainerDefinition]))
-> Maybe [ContainerDefinition] -> f (Maybe [ContainerDefinition]))
-> (Maybe [ContainerDefinition] -> f (Maybe [ContainerDefinition]))
-> TaskDefinition
-> f TaskDefinition
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. AnIso
[ContainerDefinition]
[ContainerDefinition]
[ContainerDefinition]
[ContainerDefinition]
-> Iso
(Maybe [ContainerDefinition])
(Maybe [ContainerDefinition])
(Maybe [ContainerDefinition])
(Maybe [ContainerDefinition])
forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping AnIso
[ContainerDefinition]
[ContainerDefinition]
[ContainerDefinition]
[ContainerDefinition]
forall s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced
taskDefinition_memory :: Lens.Lens' TaskDefinition (Prelude.Maybe Prelude.Text)
taskDefinition_memory :: (Maybe Text -> f (Maybe Text))
-> TaskDefinition -> f TaskDefinition
taskDefinition_memory = (TaskDefinition -> Maybe Text)
-> (TaskDefinition -> Maybe Text -> TaskDefinition)
-> Lens TaskDefinition TaskDefinition (Maybe Text) (Maybe Text)
forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TaskDefinition' {Maybe Text
memory :: Maybe Text
$sel:memory:TaskDefinition' :: TaskDefinition -> Maybe Text
memory} -> Maybe Text
memory) (\s :: TaskDefinition
s@TaskDefinition' {} Maybe Text
a -> TaskDefinition
s {$sel:memory:TaskDefinition' :: Maybe Text
memory = Maybe Text
a} :: TaskDefinition)
taskDefinition_proxyConfiguration :: Lens.Lens' TaskDefinition (Prelude.Maybe ProxyConfiguration)
taskDefinition_proxyConfiguration :: (Maybe ProxyConfiguration -> f (Maybe ProxyConfiguration))
-> TaskDefinition -> f TaskDefinition
taskDefinition_proxyConfiguration = (TaskDefinition -> Maybe ProxyConfiguration)
-> (TaskDefinition -> Maybe ProxyConfiguration -> TaskDefinition)
-> Lens
TaskDefinition
TaskDefinition
(Maybe ProxyConfiguration)
(Maybe ProxyConfiguration)
forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TaskDefinition' {Maybe ProxyConfiguration
proxyConfiguration :: Maybe ProxyConfiguration
$sel:proxyConfiguration:TaskDefinition' :: TaskDefinition -> Maybe ProxyConfiguration
proxyConfiguration} -> Maybe ProxyConfiguration
proxyConfiguration) (\s :: TaskDefinition
s@TaskDefinition' {} Maybe ProxyConfiguration
a -> TaskDefinition
s {$sel:proxyConfiguration:TaskDefinition' :: Maybe ProxyConfiguration
proxyConfiguration = Maybe ProxyConfiguration
a} :: TaskDefinition)
taskDefinition_taskRoleArn :: Lens.Lens' TaskDefinition (Prelude.Maybe Prelude.Text)
taskDefinition_taskRoleArn :: (Maybe Text -> f (Maybe Text))
-> TaskDefinition -> f TaskDefinition
taskDefinition_taskRoleArn = (TaskDefinition -> Maybe Text)
-> (TaskDefinition -> Maybe Text -> TaskDefinition)
-> Lens TaskDefinition TaskDefinition (Maybe Text) (Maybe Text)
forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TaskDefinition' {Maybe Text
taskRoleArn :: Maybe Text
$sel:taskRoleArn:TaskDefinition' :: TaskDefinition -> Maybe Text
taskRoleArn} -> Maybe Text
taskRoleArn) (\s :: TaskDefinition
s@TaskDefinition' {} Maybe Text
a -> TaskDefinition
s {$sel:taskRoleArn:TaskDefinition' :: Maybe Text
taskRoleArn = Maybe Text
a} :: TaskDefinition)
taskDefinition_deregisteredAt :: Lens.Lens' TaskDefinition (Prelude.Maybe Prelude.UTCTime)
taskDefinition_deregisteredAt :: (Maybe UTCTime -> f (Maybe UTCTime))
-> TaskDefinition -> f TaskDefinition
taskDefinition_deregisteredAt = (TaskDefinition -> Maybe POSIX)
-> (TaskDefinition -> Maybe POSIX -> TaskDefinition)
-> Lens TaskDefinition TaskDefinition (Maybe POSIX) (Maybe POSIX)
forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TaskDefinition' {Maybe POSIX
deregisteredAt :: Maybe POSIX
$sel:deregisteredAt:TaskDefinition' :: TaskDefinition -> Maybe POSIX
deregisteredAt} -> Maybe POSIX
deregisteredAt) (\s :: TaskDefinition
s@TaskDefinition' {} Maybe POSIX
a -> TaskDefinition
s {$sel:deregisteredAt:TaskDefinition' :: Maybe POSIX
deregisteredAt = Maybe POSIX
a} :: TaskDefinition) ((Maybe POSIX -> f (Maybe POSIX))
-> TaskDefinition -> f TaskDefinition)
-> ((Maybe UTCTime -> f (Maybe UTCTime))
-> Maybe POSIX -> f (Maybe POSIX))
-> (Maybe UTCTime -> f (Maybe UTCTime))
-> TaskDefinition
-> f TaskDefinition
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. AnIso POSIX POSIX UTCTime UTCTime
-> Iso (Maybe POSIX) (Maybe POSIX) (Maybe UTCTime) (Maybe UTCTime)
forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping AnIso POSIX POSIX UTCTime UTCTime
forall (a :: Format). Iso' (Time a) UTCTime
Core._Time
taskDefinition_placementConstraints :: Lens.Lens' TaskDefinition (Prelude.Maybe [TaskDefinitionPlacementConstraint])
taskDefinition_placementConstraints :: (Maybe [TaskDefinitionPlacementConstraint]
-> f (Maybe [TaskDefinitionPlacementConstraint]))
-> TaskDefinition -> f TaskDefinition
taskDefinition_placementConstraints = (TaskDefinition -> Maybe [TaskDefinitionPlacementConstraint])
-> (TaskDefinition
-> Maybe [TaskDefinitionPlacementConstraint] -> TaskDefinition)
-> Lens
TaskDefinition
TaskDefinition
(Maybe [TaskDefinitionPlacementConstraint])
(Maybe [TaskDefinitionPlacementConstraint])
forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TaskDefinition' {Maybe [TaskDefinitionPlacementConstraint]
placementConstraints :: Maybe [TaskDefinitionPlacementConstraint]
$sel:placementConstraints:TaskDefinition' :: TaskDefinition -> Maybe [TaskDefinitionPlacementConstraint]
placementConstraints} -> Maybe [TaskDefinitionPlacementConstraint]
placementConstraints) (\s :: TaskDefinition
s@TaskDefinition' {} Maybe [TaskDefinitionPlacementConstraint]
a -> TaskDefinition
s {$sel:placementConstraints:TaskDefinition' :: Maybe [TaskDefinitionPlacementConstraint]
placementConstraints = Maybe [TaskDefinitionPlacementConstraint]
a} :: TaskDefinition) ((Maybe [TaskDefinitionPlacementConstraint]
-> f (Maybe [TaskDefinitionPlacementConstraint]))
-> TaskDefinition -> f TaskDefinition)
-> ((Maybe [TaskDefinitionPlacementConstraint]
-> f (Maybe [TaskDefinitionPlacementConstraint]))
-> Maybe [TaskDefinitionPlacementConstraint]
-> f (Maybe [TaskDefinitionPlacementConstraint]))
-> (Maybe [TaskDefinitionPlacementConstraint]
-> f (Maybe [TaskDefinitionPlacementConstraint]))
-> TaskDefinition
-> f TaskDefinition
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. AnIso
[TaskDefinitionPlacementConstraint]
[TaskDefinitionPlacementConstraint]
[TaskDefinitionPlacementConstraint]
[TaskDefinitionPlacementConstraint]
-> Iso
(Maybe [TaskDefinitionPlacementConstraint])
(Maybe [TaskDefinitionPlacementConstraint])
(Maybe [TaskDefinitionPlacementConstraint])
(Maybe [TaskDefinitionPlacementConstraint])
forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping AnIso
[TaskDefinitionPlacementConstraint]
[TaskDefinitionPlacementConstraint]
[TaskDefinitionPlacementConstraint]
[TaskDefinitionPlacementConstraint]
forall s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced
taskDefinition_registeredAt :: Lens.Lens' TaskDefinition (Prelude.Maybe Prelude.UTCTime)
taskDefinition_registeredAt :: (Maybe UTCTime -> f (Maybe UTCTime))
-> TaskDefinition -> f TaskDefinition
taskDefinition_registeredAt = (TaskDefinition -> Maybe POSIX)
-> (TaskDefinition -> Maybe POSIX -> TaskDefinition)
-> Lens TaskDefinition TaskDefinition (Maybe POSIX) (Maybe POSIX)
forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TaskDefinition' {Maybe POSIX
registeredAt :: Maybe POSIX
$sel:registeredAt:TaskDefinition' :: TaskDefinition -> Maybe POSIX
registeredAt} -> Maybe POSIX
registeredAt) (\s :: TaskDefinition
s@TaskDefinition' {} Maybe POSIX
a -> TaskDefinition
s {$sel:registeredAt:TaskDefinition' :: Maybe POSIX
registeredAt = Maybe POSIX
a} :: TaskDefinition) ((Maybe POSIX -> f (Maybe POSIX))
-> TaskDefinition -> f TaskDefinition)
-> ((Maybe UTCTime -> f (Maybe UTCTime))
-> Maybe POSIX -> f (Maybe POSIX))
-> (Maybe UTCTime -> f (Maybe UTCTime))
-> TaskDefinition
-> f TaskDefinition
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. AnIso POSIX POSIX UTCTime UTCTime
-> Iso (Maybe POSIX) (Maybe POSIX) (Maybe UTCTime) (Maybe UTCTime)
forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping AnIso POSIX POSIX UTCTime UTCTime
forall (a :: Format). Iso' (Time a) UTCTime
Core._Time
taskDefinition_networkMode :: Lens.Lens' TaskDefinition (Prelude.Maybe NetworkMode)
taskDefinition_networkMode :: (Maybe NetworkMode -> f (Maybe NetworkMode))
-> TaskDefinition -> f TaskDefinition
taskDefinition_networkMode = (TaskDefinition -> Maybe NetworkMode)
-> (TaskDefinition -> Maybe NetworkMode -> TaskDefinition)
-> Lens
TaskDefinition
TaskDefinition
(Maybe NetworkMode)
(Maybe NetworkMode)
forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TaskDefinition' {Maybe NetworkMode
networkMode :: Maybe NetworkMode
$sel:networkMode:TaskDefinition' :: TaskDefinition -> Maybe NetworkMode
networkMode} -> Maybe NetworkMode
networkMode) (\s :: TaskDefinition
s@TaskDefinition' {} Maybe NetworkMode
a -> TaskDefinition
s {$sel:networkMode:TaskDefinition' :: Maybe NetworkMode
networkMode = Maybe NetworkMode
a} :: TaskDefinition)
taskDefinition_taskDefinitionArn :: Lens.Lens' TaskDefinition (Prelude.Maybe Prelude.Text)
taskDefinition_taskDefinitionArn :: (Maybe Text -> f (Maybe Text))
-> TaskDefinition -> f TaskDefinition
taskDefinition_taskDefinitionArn = (TaskDefinition -> Maybe Text)
-> (TaskDefinition -> Maybe Text -> TaskDefinition)
-> Lens TaskDefinition TaskDefinition (Maybe Text) (Maybe Text)
forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TaskDefinition' {Maybe Text
taskDefinitionArn :: Maybe Text
$sel:taskDefinitionArn:TaskDefinition' :: TaskDefinition -> Maybe Text
taskDefinitionArn} -> Maybe Text
taskDefinitionArn) (\s :: TaskDefinition
s@TaskDefinition' {} Maybe Text
a -> TaskDefinition
s {$sel:taskDefinitionArn:TaskDefinition' :: Maybe Text
taskDefinitionArn = Maybe Text
a} :: TaskDefinition)
taskDefinition_compatibilities :: Lens.Lens' TaskDefinition (Prelude.Maybe [Compatibility])
taskDefinition_compatibilities :: (Maybe [Compatibility] -> f (Maybe [Compatibility]))
-> TaskDefinition -> f TaskDefinition
taskDefinition_compatibilities = (TaskDefinition -> Maybe [Compatibility])
-> (TaskDefinition -> Maybe [Compatibility] -> TaskDefinition)
-> Lens
TaskDefinition
TaskDefinition
(Maybe [Compatibility])
(Maybe [Compatibility])
forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TaskDefinition' {Maybe [Compatibility]
compatibilities :: Maybe [Compatibility]
$sel:compatibilities:TaskDefinition' :: TaskDefinition -> Maybe [Compatibility]
compatibilities} -> Maybe [Compatibility]
compatibilities) (\s :: TaskDefinition
s@TaskDefinition' {} Maybe [Compatibility]
a -> TaskDefinition
s {$sel:compatibilities:TaskDefinition' :: Maybe [Compatibility]
compatibilities = Maybe [Compatibility]
a} :: TaskDefinition) ((Maybe [Compatibility] -> f (Maybe [Compatibility]))
-> TaskDefinition -> f TaskDefinition)
-> ((Maybe [Compatibility] -> f (Maybe [Compatibility]))
-> Maybe [Compatibility] -> f (Maybe [Compatibility]))
-> (Maybe [Compatibility] -> f (Maybe [Compatibility]))
-> TaskDefinition
-> f TaskDefinition
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. AnIso
[Compatibility] [Compatibility] [Compatibility] [Compatibility]
-> Iso
(Maybe [Compatibility])
(Maybe [Compatibility])
(Maybe [Compatibility])
(Maybe [Compatibility])
forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping AnIso
[Compatibility] [Compatibility] [Compatibility] [Compatibility]
forall s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced
taskDefinition_registeredBy :: Lens.Lens' TaskDefinition (Prelude.Maybe Prelude.Text)
taskDefinition_registeredBy :: (Maybe Text -> f (Maybe Text))
-> TaskDefinition -> f TaskDefinition
taskDefinition_registeredBy = (TaskDefinition -> Maybe Text)
-> (TaskDefinition -> Maybe Text -> TaskDefinition)
-> Lens TaskDefinition TaskDefinition (Maybe Text) (Maybe Text)
forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TaskDefinition' {Maybe Text
registeredBy :: Maybe Text
$sel:registeredBy:TaskDefinition' :: TaskDefinition -> Maybe Text
registeredBy} -> Maybe Text
registeredBy) (\s :: TaskDefinition
s@TaskDefinition' {} Maybe Text
a -> TaskDefinition
s {$sel:registeredBy:TaskDefinition' :: Maybe Text
registeredBy = Maybe Text
a} :: TaskDefinition)
taskDefinition_revision :: Lens.Lens' TaskDefinition (Prelude.Maybe Prelude.Int)
taskDefinition_revision :: (Maybe Int -> f (Maybe Int)) -> TaskDefinition -> f TaskDefinition
taskDefinition_revision = (TaskDefinition -> Maybe Int)
-> (TaskDefinition -> Maybe Int -> TaskDefinition)
-> Lens TaskDefinition TaskDefinition (Maybe Int) (Maybe Int)
forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TaskDefinition' {Maybe Int
revision :: Maybe Int
$sel:revision:TaskDefinition' :: TaskDefinition -> Maybe Int
revision} -> Maybe Int
revision) (\s :: TaskDefinition
s@TaskDefinition' {} Maybe Int
a -> TaskDefinition
s {$sel:revision:TaskDefinition' :: Maybe Int
revision = Maybe Int
a} :: TaskDefinition)
taskDefinition_volumes :: Lens.Lens' TaskDefinition (Prelude.Maybe [Volume])
taskDefinition_volumes :: (Maybe [Volume] -> f (Maybe [Volume]))
-> TaskDefinition -> f TaskDefinition
taskDefinition_volumes = (TaskDefinition -> Maybe [Volume])
-> (TaskDefinition -> Maybe [Volume] -> TaskDefinition)
-> Lens
TaskDefinition TaskDefinition (Maybe [Volume]) (Maybe [Volume])
forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TaskDefinition' {Maybe [Volume]
volumes :: Maybe [Volume]
$sel:volumes:TaskDefinition' :: TaskDefinition -> Maybe [Volume]
volumes} -> Maybe [Volume]
volumes) (\s :: TaskDefinition
s@TaskDefinition' {} Maybe [Volume]
a -> TaskDefinition
s {$sel:volumes:TaskDefinition' :: Maybe [Volume]
volumes = Maybe [Volume]
a} :: TaskDefinition) ((Maybe [Volume] -> f (Maybe [Volume]))
-> TaskDefinition -> f TaskDefinition)
-> ((Maybe [Volume] -> f (Maybe [Volume]))
-> Maybe [Volume] -> f (Maybe [Volume]))
-> (Maybe [Volume] -> f (Maybe [Volume]))
-> TaskDefinition
-> f TaskDefinition
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. AnIso [Volume] [Volume] [Volume] [Volume]
-> Iso
(Maybe [Volume]) (Maybe [Volume]) (Maybe [Volume]) (Maybe [Volume])
forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping AnIso [Volume] [Volume] [Volume] [Volume]
forall s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced
taskDefinition_cpu :: Lens.Lens' TaskDefinition (Prelude.Maybe Prelude.Text)
taskDefinition_cpu :: (Maybe Text -> f (Maybe Text))
-> TaskDefinition -> f TaskDefinition
taskDefinition_cpu = (TaskDefinition -> Maybe Text)
-> (TaskDefinition -> Maybe Text -> TaskDefinition)
-> Lens TaskDefinition TaskDefinition (Maybe Text) (Maybe Text)
forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TaskDefinition' {Maybe Text
cpu :: Maybe Text
$sel:cpu:TaskDefinition' :: TaskDefinition -> Maybe Text
cpu} -> Maybe Text
cpu) (\s :: TaskDefinition
s@TaskDefinition' {} Maybe Text
a -> TaskDefinition
s {$sel:cpu:TaskDefinition' :: Maybe Text
cpu = Maybe Text
a} :: TaskDefinition)
taskDefinition_requiresAttributes :: Lens.Lens' TaskDefinition (Prelude.Maybe [Attribute])
taskDefinition_requiresAttributes :: (Maybe [Attribute] -> f (Maybe [Attribute]))
-> TaskDefinition -> f TaskDefinition
taskDefinition_requiresAttributes = (TaskDefinition -> Maybe [Attribute])
-> (TaskDefinition -> Maybe [Attribute] -> TaskDefinition)
-> Lens
TaskDefinition
TaskDefinition
(Maybe [Attribute])
(Maybe [Attribute])
forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TaskDefinition' {Maybe [Attribute]
requiresAttributes :: Maybe [Attribute]
$sel:requiresAttributes:TaskDefinition' :: TaskDefinition -> Maybe [Attribute]
requiresAttributes} -> Maybe [Attribute]
requiresAttributes) (\s :: TaskDefinition
s@TaskDefinition' {} Maybe [Attribute]
a -> TaskDefinition
s {$sel:requiresAttributes:TaskDefinition' :: Maybe [Attribute]
requiresAttributes = Maybe [Attribute]
a} :: TaskDefinition) ((Maybe [Attribute] -> f (Maybe [Attribute]))
-> TaskDefinition -> f TaskDefinition)
-> ((Maybe [Attribute] -> f (Maybe [Attribute]))
-> Maybe [Attribute] -> f (Maybe [Attribute]))
-> (Maybe [Attribute] -> f (Maybe [Attribute]))
-> TaskDefinition
-> f TaskDefinition
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. AnIso [Attribute] [Attribute] [Attribute] [Attribute]
-> Iso
(Maybe [Attribute])
(Maybe [Attribute])
(Maybe [Attribute])
(Maybe [Attribute])
forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping AnIso [Attribute] [Attribute] [Attribute] [Attribute]
forall s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced
instance Core.FromJSON TaskDefinition where
parseJSON :: Value -> Parser TaskDefinition
parseJSON =
String
-> (Object -> Parser TaskDefinition)
-> Value
-> Parser TaskDefinition
forall a. String -> (Object -> Parser a) -> Value -> Parser a
Core.withObject
String
"TaskDefinition"
( \Object
x ->
Maybe TaskDefinitionStatus
-> Maybe [InferenceAccelerator]
-> Maybe Text
-> Maybe [Compatibility]
-> Maybe EphemeralStorage
-> Maybe PidMode
-> Maybe Text
-> Maybe IpcMode
-> Maybe [ContainerDefinition]
-> Maybe Text
-> Maybe ProxyConfiguration
-> Maybe Text
-> Maybe POSIX
-> Maybe [TaskDefinitionPlacementConstraint]
-> Maybe POSIX
-> Maybe NetworkMode
-> Maybe Text
-> Maybe [Compatibility]
-> Maybe Text
-> Maybe Int
-> Maybe [Volume]
-> Maybe Text
-> Maybe [Attribute]
-> TaskDefinition
TaskDefinition'
(Maybe TaskDefinitionStatus
-> Maybe [InferenceAccelerator]
-> Maybe Text
-> Maybe [Compatibility]
-> Maybe EphemeralStorage
-> Maybe PidMode
-> Maybe Text
-> Maybe IpcMode
-> Maybe [ContainerDefinition]
-> Maybe Text
-> Maybe ProxyConfiguration
-> Maybe Text
-> Maybe POSIX
-> Maybe [TaskDefinitionPlacementConstraint]
-> Maybe POSIX
-> Maybe NetworkMode
-> Maybe Text
-> Maybe [Compatibility]
-> Maybe Text
-> Maybe Int
-> Maybe [Volume]
-> Maybe Text
-> Maybe [Attribute]
-> TaskDefinition)
-> Parser (Maybe TaskDefinitionStatus)
-> Parser
(Maybe [InferenceAccelerator]
-> Maybe Text
-> Maybe [Compatibility]
-> Maybe EphemeralStorage
-> Maybe PidMode
-> Maybe Text
-> Maybe IpcMode
-> Maybe [ContainerDefinition]
-> Maybe Text
-> Maybe ProxyConfiguration
-> Maybe Text
-> Maybe POSIX
-> Maybe [TaskDefinitionPlacementConstraint]
-> Maybe POSIX
-> Maybe NetworkMode
-> Maybe Text
-> Maybe [Compatibility]
-> Maybe Text
-> Maybe Int
-> Maybe [Volume]
-> Maybe Text
-> Maybe [Attribute]
-> TaskDefinition)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> (Object
x Object -> Text -> Parser (Maybe TaskDefinitionStatus)
forall a. FromJSON a => Object -> Text -> Parser (Maybe a)
Core..:? Text
"status")
Parser
(Maybe [InferenceAccelerator]
-> Maybe Text
-> Maybe [Compatibility]
-> Maybe EphemeralStorage
-> Maybe PidMode
-> Maybe Text
-> Maybe IpcMode
-> Maybe [ContainerDefinition]
-> Maybe Text
-> Maybe ProxyConfiguration
-> Maybe Text
-> Maybe POSIX
-> Maybe [TaskDefinitionPlacementConstraint]
-> Maybe POSIX
-> Maybe NetworkMode
-> Maybe Text
-> Maybe [Compatibility]
-> Maybe Text
-> Maybe Int
-> Maybe [Volume]
-> Maybe Text
-> Maybe [Attribute]
-> TaskDefinition)
-> Parser (Maybe [InferenceAccelerator])
-> Parser
(Maybe Text
-> Maybe [Compatibility]
-> Maybe EphemeralStorage
-> Maybe PidMode
-> Maybe Text
-> Maybe IpcMode
-> Maybe [ContainerDefinition]
-> Maybe Text
-> Maybe ProxyConfiguration
-> Maybe Text
-> Maybe POSIX
-> Maybe [TaskDefinitionPlacementConstraint]
-> Maybe POSIX
-> Maybe NetworkMode
-> Maybe Text
-> Maybe [Compatibility]
-> Maybe Text
-> Maybe Int
-> Maybe [Volume]
-> Maybe Text
-> Maybe [Attribute]
-> TaskDefinition)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> ( Object
x Object -> Text -> Parser (Maybe (Maybe [InferenceAccelerator]))
forall a. FromJSON a => Object -> Text -> Parser (Maybe a)
Core..:? Text
"inferenceAccelerators"
Parser (Maybe (Maybe [InferenceAccelerator]))
-> Maybe [InferenceAccelerator]
-> Parser (Maybe [InferenceAccelerator])
forall a. Parser (Maybe a) -> a -> Parser a
Core..!= Maybe [InferenceAccelerator]
forall a. Monoid a => a
Prelude.mempty
)
Parser
(Maybe Text
-> Maybe [Compatibility]
-> Maybe EphemeralStorage
-> Maybe PidMode
-> Maybe Text
-> Maybe IpcMode
-> Maybe [ContainerDefinition]
-> Maybe Text
-> Maybe ProxyConfiguration
-> Maybe Text
-> Maybe POSIX
-> Maybe [TaskDefinitionPlacementConstraint]
-> Maybe POSIX
-> Maybe NetworkMode
-> Maybe Text
-> Maybe [Compatibility]
-> Maybe Text
-> Maybe Int
-> Maybe [Volume]
-> Maybe Text
-> Maybe [Attribute]
-> TaskDefinition)
-> Parser (Maybe Text)
-> Parser
(Maybe [Compatibility]
-> Maybe EphemeralStorage
-> Maybe PidMode
-> Maybe Text
-> Maybe IpcMode
-> Maybe [ContainerDefinition]
-> Maybe Text
-> Maybe ProxyConfiguration
-> Maybe Text
-> Maybe POSIX
-> Maybe [TaskDefinitionPlacementConstraint]
-> Maybe POSIX
-> Maybe NetworkMode
-> Maybe Text
-> Maybe [Compatibility]
-> Maybe Text
-> Maybe Int
-> Maybe [Volume]
-> Maybe Text
-> Maybe [Attribute]
-> TaskDefinition)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x Object -> Text -> Parser (Maybe Text)
forall a. FromJSON a => Object -> Text -> Parser (Maybe a)
Core..:? Text
"executionRoleArn")
Parser
(Maybe [Compatibility]
-> Maybe EphemeralStorage
-> Maybe PidMode
-> Maybe Text
-> Maybe IpcMode
-> Maybe [ContainerDefinition]
-> Maybe Text
-> Maybe ProxyConfiguration
-> Maybe Text
-> Maybe POSIX
-> Maybe [TaskDefinitionPlacementConstraint]
-> Maybe POSIX
-> Maybe NetworkMode
-> Maybe Text
-> Maybe [Compatibility]
-> Maybe Text
-> Maybe Int
-> Maybe [Volume]
-> Maybe Text
-> Maybe [Attribute]
-> TaskDefinition)
-> Parser (Maybe [Compatibility])
-> Parser
(Maybe EphemeralStorage
-> Maybe PidMode
-> Maybe Text
-> Maybe IpcMode
-> Maybe [ContainerDefinition]
-> Maybe Text
-> Maybe ProxyConfiguration
-> Maybe Text
-> Maybe POSIX
-> Maybe [TaskDefinitionPlacementConstraint]
-> Maybe POSIX
-> Maybe NetworkMode
-> Maybe Text
-> Maybe [Compatibility]
-> Maybe Text
-> Maybe Int
-> Maybe [Volume]
-> Maybe Text
-> Maybe [Attribute]
-> TaskDefinition)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> ( Object
x Object -> Text -> Parser (Maybe (Maybe [Compatibility]))
forall a. FromJSON a => Object -> Text -> Parser (Maybe a)
Core..:? Text
"requiresCompatibilities"
Parser (Maybe (Maybe [Compatibility]))
-> Maybe [Compatibility] -> Parser (Maybe [Compatibility])
forall a. Parser (Maybe a) -> a -> Parser a
Core..!= Maybe [Compatibility]
forall a. Monoid a => a
Prelude.mempty
)
Parser
(Maybe EphemeralStorage
-> Maybe PidMode
-> Maybe Text
-> Maybe IpcMode
-> Maybe [ContainerDefinition]
-> Maybe Text
-> Maybe ProxyConfiguration
-> Maybe Text
-> Maybe POSIX
-> Maybe [TaskDefinitionPlacementConstraint]
-> Maybe POSIX
-> Maybe NetworkMode
-> Maybe Text
-> Maybe [Compatibility]
-> Maybe Text
-> Maybe Int
-> Maybe [Volume]
-> Maybe Text
-> Maybe [Attribute]
-> TaskDefinition)
-> Parser (Maybe EphemeralStorage)
-> Parser
(Maybe PidMode
-> Maybe Text
-> Maybe IpcMode
-> Maybe [ContainerDefinition]
-> Maybe Text
-> Maybe ProxyConfiguration
-> Maybe Text
-> Maybe POSIX
-> Maybe [TaskDefinitionPlacementConstraint]
-> Maybe POSIX
-> Maybe NetworkMode
-> Maybe Text
-> Maybe [Compatibility]
-> Maybe Text
-> Maybe Int
-> Maybe [Volume]
-> Maybe Text
-> Maybe [Attribute]
-> TaskDefinition)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x Object -> Text -> Parser (Maybe EphemeralStorage)
forall a. FromJSON a => Object -> Text -> Parser (Maybe a)
Core..:? Text
"ephemeralStorage")
Parser
(Maybe PidMode
-> Maybe Text
-> Maybe IpcMode
-> Maybe [ContainerDefinition]
-> Maybe Text
-> Maybe ProxyConfiguration
-> Maybe Text
-> Maybe POSIX
-> Maybe [TaskDefinitionPlacementConstraint]
-> Maybe POSIX
-> Maybe NetworkMode
-> Maybe Text
-> Maybe [Compatibility]
-> Maybe Text
-> Maybe Int
-> Maybe [Volume]
-> Maybe Text
-> Maybe [Attribute]
-> TaskDefinition)
-> Parser (Maybe PidMode)
-> Parser
(Maybe Text
-> Maybe IpcMode
-> Maybe [ContainerDefinition]
-> Maybe Text
-> Maybe ProxyConfiguration
-> Maybe Text
-> Maybe POSIX
-> Maybe [TaskDefinitionPlacementConstraint]
-> Maybe POSIX
-> Maybe NetworkMode
-> Maybe Text
-> Maybe [Compatibility]
-> Maybe Text
-> Maybe Int
-> Maybe [Volume]
-> Maybe Text
-> Maybe [Attribute]
-> TaskDefinition)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x Object -> Text -> Parser (Maybe PidMode)
forall a. FromJSON a => Object -> Text -> Parser (Maybe a)
Core..:? Text
"pidMode")
Parser
(Maybe Text
-> Maybe IpcMode
-> Maybe [ContainerDefinition]
-> Maybe Text
-> Maybe ProxyConfiguration
-> Maybe Text
-> Maybe POSIX
-> Maybe [TaskDefinitionPlacementConstraint]
-> Maybe POSIX
-> Maybe NetworkMode
-> Maybe Text
-> Maybe [Compatibility]
-> Maybe Text
-> Maybe Int
-> Maybe [Volume]
-> Maybe Text
-> Maybe [Attribute]
-> TaskDefinition)
-> Parser (Maybe Text)
-> Parser
(Maybe IpcMode
-> Maybe [ContainerDefinition]
-> Maybe Text
-> Maybe ProxyConfiguration
-> Maybe Text
-> Maybe POSIX
-> Maybe [TaskDefinitionPlacementConstraint]
-> Maybe POSIX
-> Maybe NetworkMode
-> Maybe Text
-> Maybe [Compatibility]
-> Maybe Text
-> Maybe Int
-> Maybe [Volume]
-> Maybe Text
-> Maybe [Attribute]
-> TaskDefinition)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x Object -> Text -> Parser (Maybe Text)
forall a. FromJSON a => Object -> Text -> Parser (Maybe a)
Core..:? Text
"family")
Parser
(Maybe IpcMode
-> Maybe [ContainerDefinition]
-> Maybe Text
-> Maybe ProxyConfiguration
-> Maybe Text
-> Maybe POSIX
-> Maybe [TaskDefinitionPlacementConstraint]
-> Maybe POSIX
-> Maybe NetworkMode
-> Maybe Text
-> Maybe [Compatibility]
-> Maybe Text
-> Maybe Int
-> Maybe [Volume]
-> Maybe Text
-> Maybe [Attribute]
-> TaskDefinition)
-> Parser (Maybe IpcMode)
-> Parser
(Maybe [ContainerDefinition]
-> Maybe Text
-> Maybe ProxyConfiguration
-> Maybe Text
-> Maybe POSIX
-> Maybe [TaskDefinitionPlacementConstraint]
-> Maybe POSIX
-> Maybe NetworkMode
-> Maybe Text
-> Maybe [Compatibility]
-> Maybe Text
-> Maybe Int
-> Maybe [Volume]
-> Maybe Text
-> Maybe [Attribute]
-> TaskDefinition)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x Object -> Text -> Parser (Maybe IpcMode)
forall a. FromJSON a => Object -> Text -> Parser (Maybe a)
Core..:? Text
"ipcMode")
Parser
(Maybe [ContainerDefinition]
-> Maybe Text
-> Maybe ProxyConfiguration
-> Maybe Text
-> Maybe POSIX
-> Maybe [TaskDefinitionPlacementConstraint]
-> Maybe POSIX
-> Maybe NetworkMode
-> Maybe Text
-> Maybe [Compatibility]
-> Maybe Text
-> Maybe Int
-> Maybe [Volume]
-> Maybe Text
-> Maybe [Attribute]
-> TaskDefinition)
-> Parser (Maybe [ContainerDefinition])
-> Parser
(Maybe Text
-> Maybe ProxyConfiguration
-> Maybe Text
-> Maybe POSIX
-> Maybe [TaskDefinitionPlacementConstraint]
-> Maybe POSIX
-> Maybe NetworkMode
-> Maybe Text
-> Maybe [Compatibility]
-> Maybe Text
-> Maybe Int
-> Maybe [Volume]
-> Maybe Text
-> Maybe [Attribute]
-> TaskDefinition)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> ( Object
x Object -> Text -> Parser (Maybe (Maybe [ContainerDefinition]))
forall a. FromJSON a => Object -> Text -> Parser (Maybe a)
Core..:? Text
"containerDefinitions"
Parser (Maybe (Maybe [ContainerDefinition]))
-> Maybe [ContainerDefinition]
-> Parser (Maybe [ContainerDefinition])
forall a. Parser (Maybe a) -> a -> Parser a
Core..!= Maybe [ContainerDefinition]
forall a. Monoid a => a
Prelude.mempty
)
Parser
(Maybe Text
-> Maybe ProxyConfiguration
-> Maybe Text
-> Maybe POSIX
-> Maybe [TaskDefinitionPlacementConstraint]
-> Maybe POSIX
-> Maybe NetworkMode
-> Maybe Text
-> Maybe [Compatibility]
-> Maybe Text
-> Maybe Int
-> Maybe [Volume]
-> Maybe Text
-> Maybe [Attribute]
-> TaskDefinition)
-> Parser (Maybe Text)
-> Parser
(Maybe ProxyConfiguration
-> Maybe Text
-> Maybe POSIX
-> Maybe [TaskDefinitionPlacementConstraint]
-> Maybe POSIX
-> Maybe NetworkMode
-> Maybe Text
-> Maybe [Compatibility]
-> Maybe Text
-> Maybe Int
-> Maybe [Volume]
-> Maybe Text
-> Maybe [Attribute]
-> TaskDefinition)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x Object -> Text -> Parser (Maybe Text)
forall a. FromJSON a => Object -> Text -> Parser (Maybe a)
Core..:? Text
"memory")
Parser
(Maybe ProxyConfiguration
-> Maybe Text
-> Maybe POSIX
-> Maybe [TaskDefinitionPlacementConstraint]
-> Maybe POSIX
-> Maybe NetworkMode
-> Maybe Text
-> Maybe [Compatibility]
-> Maybe Text
-> Maybe Int
-> Maybe [Volume]
-> Maybe Text
-> Maybe [Attribute]
-> TaskDefinition)
-> Parser (Maybe ProxyConfiguration)
-> Parser
(Maybe Text
-> Maybe POSIX
-> Maybe [TaskDefinitionPlacementConstraint]
-> Maybe POSIX
-> Maybe NetworkMode
-> Maybe Text
-> Maybe [Compatibility]
-> Maybe Text
-> Maybe Int
-> Maybe [Volume]
-> Maybe Text
-> Maybe [Attribute]
-> TaskDefinition)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x Object -> Text -> Parser (Maybe ProxyConfiguration)
forall a. FromJSON a => Object -> Text -> Parser (Maybe a)
Core..:? Text
"proxyConfiguration")
Parser
(Maybe Text
-> Maybe POSIX
-> Maybe [TaskDefinitionPlacementConstraint]
-> Maybe POSIX
-> Maybe NetworkMode
-> Maybe Text
-> Maybe [Compatibility]
-> Maybe Text
-> Maybe Int
-> Maybe [Volume]
-> Maybe Text
-> Maybe [Attribute]
-> TaskDefinition)
-> Parser (Maybe Text)
-> Parser
(Maybe POSIX
-> Maybe [TaskDefinitionPlacementConstraint]
-> Maybe POSIX
-> Maybe NetworkMode
-> Maybe Text
-> Maybe [Compatibility]
-> Maybe Text
-> Maybe Int
-> Maybe [Volume]
-> Maybe Text
-> Maybe [Attribute]
-> TaskDefinition)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x Object -> Text -> Parser (Maybe Text)
forall a. FromJSON a => Object -> Text -> Parser (Maybe a)
Core..:? Text
"taskRoleArn")
Parser
(Maybe POSIX
-> Maybe [TaskDefinitionPlacementConstraint]
-> Maybe POSIX
-> Maybe NetworkMode
-> Maybe Text
-> Maybe [Compatibility]
-> Maybe Text
-> Maybe Int
-> Maybe [Volume]
-> Maybe Text
-> Maybe [Attribute]
-> TaskDefinition)
-> Parser (Maybe POSIX)
-> Parser
(Maybe [TaskDefinitionPlacementConstraint]
-> Maybe POSIX
-> Maybe NetworkMode
-> Maybe Text
-> Maybe [Compatibility]
-> Maybe Text
-> Maybe Int
-> Maybe [Volume]
-> Maybe Text
-> Maybe [Attribute]
-> TaskDefinition)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x Object -> Text -> Parser (Maybe POSIX)
forall a. FromJSON a => Object -> Text -> Parser (Maybe a)
Core..:? Text
"deregisteredAt")
Parser
(Maybe [TaskDefinitionPlacementConstraint]
-> Maybe POSIX
-> Maybe NetworkMode
-> Maybe Text
-> Maybe [Compatibility]
-> Maybe Text
-> Maybe Int
-> Maybe [Volume]
-> Maybe Text
-> Maybe [Attribute]
-> TaskDefinition)
-> Parser (Maybe [TaskDefinitionPlacementConstraint])
-> Parser
(Maybe POSIX
-> Maybe NetworkMode
-> Maybe Text
-> Maybe [Compatibility]
-> Maybe Text
-> Maybe Int
-> Maybe [Volume]
-> Maybe Text
-> Maybe [Attribute]
-> TaskDefinition)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> ( Object
x Object
-> Text
-> Parser (Maybe (Maybe [TaskDefinitionPlacementConstraint]))
forall a. FromJSON a => Object -> Text -> Parser (Maybe a)
Core..:? Text
"placementConstraints"
Parser (Maybe (Maybe [TaskDefinitionPlacementConstraint]))
-> Maybe [TaskDefinitionPlacementConstraint]
-> Parser (Maybe [TaskDefinitionPlacementConstraint])
forall a. Parser (Maybe a) -> a -> Parser a
Core..!= Maybe [TaskDefinitionPlacementConstraint]
forall a. Monoid a => a
Prelude.mempty
)
Parser
(Maybe POSIX
-> Maybe NetworkMode
-> Maybe Text
-> Maybe [Compatibility]
-> Maybe Text
-> Maybe Int
-> Maybe [Volume]
-> Maybe Text
-> Maybe [Attribute]
-> TaskDefinition)
-> Parser (Maybe POSIX)
-> Parser
(Maybe NetworkMode
-> Maybe Text
-> Maybe [Compatibility]
-> Maybe Text
-> Maybe Int
-> Maybe [Volume]
-> Maybe Text
-> Maybe [Attribute]
-> TaskDefinition)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x Object -> Text -> Parser (Maybe POSIX)
forall a. FromJSON a => Object -> Text -> Parser (Maybe a)
Core..:? Text
"registeredAt")
Parser
(Maybe NetworkMode
-> Maybe Text
-> Maybe [Compatibility]
-> Maybe Text
-> Maybe Int
-> Maybe [Volume]
-> Maybe Text
-> Maybe [Attribute]
-> TaskDefinition)
-> Parser (Maybe NetworkMode)
-> Parser
(Maybe Text
-> Maybe [Compatibility]
-> Maybe Text
-> Maybe Int
-> Maybe [Volume]
-> Maybe Text
-> Maybe [Attribute]
-> TaskDefinition)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x Object -> Text -> Parser (Maybe NetworkMode)
forall a. FromJSON a => Object -> Text -> Parser (Maybe a)
Core..:? Text
"networkMode")
Parser
(Maybe Text
-> Maybe [Compatibility]
-> Maybe Text
-> Maybe Int
-> Maybe [Volume]
-> Maybe Text
-> Maybe [Attribute]
-> TaskDefinition)
-> Parser (Maybe Text)
-> Parser
(Maybe [Compatibility]
-> Maybe Text
-> Maybe Int
-> Maybe [Volume]
-> Maybe Text
-> Maybe [Attribute]
-> TaskDefinition)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x Object -> Text -> Parser (Maybe Text)
forall a. FromJSON a => Object -> Text -> Parser (Maybe a)
Core..:? Text
"taskDefinitionArn")
Parser
(Maybe [Compatibility]
-> Maybe Text
-> Maybe Int
-> Maybe [Volume]
-> Maybe Text
-> Maybe [Attribute]
-> TaskDefinition)
-> Parser (Maybe [Compatibility])
-> Parser
(Maybe Text
-> Maybe Int
-> Maybe [Volume]
-> Maybe Text
-> Maybe [Attribute]
-> TaskDefinition)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> ( Object
x Object -> Text -> Parser (Maybe (Maybe [Compatibility]))
forall a. FromJSON a => Object -> Text -> Parser (Maybe a)
Core..:? Text
"compatibilities"
Parser (Maybe (Maybe [Compatibility]))
-> Maybe [Compatibility] -> Parser (Maybe [Compatibility])
forall a. Parser (Maybe a) -> a -> Parser a
Core..!= Maybe [Compatibility]
forall a. Monoid a => a
Prelude.mempty
)
Parser
(Maybe Text
-> Maybe Int
-> Maybe [Volume]
-> Maybe Text
-> Maybe [Attribute]
-> TaskDefinition)
-> Parser (Maybe Text)
-> Parser
(Maybe Int
-> Maybe [Volume]
-> Maybe Text
-> Maybe [Attribute]
-> TaskDefinition)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x Object -> Text -> Parser (Maybe Text)
forall a. FromJSON a => Object -> Text -> Parser (Maybe a)
Core..:? Text
"registeredBy")
Parser
(Maybe Int
-> Maybe [Volume]
-> Maybe Text
-> Maybe [Attribute]
-> TaskDefinition)
-> Parser (Maybe Int)
-> Parser
(Maybe [Volume]
-> Maybe Text -> Maybe [Attribute] -> TaskDefinition)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x Object -> Text -> Parser (Maybe Int)
forall a. FromJSON a => Object -> Text -> Parser (Maybe a)
Core..:? Text
"revision")
Parser
(Maybe [Volume]
-> Maybe Text -> Maybe [Attribute] -> TaskDefinition)
-> Parser (Maybe [Volume])
-> Parser (Maybe Text -> Maybe [Attribute] -> TaskDefinition)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x Object -> Text -> Parser (Maybe (Maybe [Volume]))
forall a. FromJSON a => Object -> Text -> Parser (Maybe a)
Core..:? Text
"volumes" Parser (Maybe (Maybe [Volume]))
-> Maybe [Volume] -> Parser (Maybe [Volume])
forall a. Parser (Maybe a) -> a -> Parser a
Core..!= Maybe [Volume]
forall a. Monoid a => a
Prelude.mempty)
Parser (Maybe Text -> Maybe [Attribute] -> TaskDefinition)
-> Parser (Maybe Text)
-> Parser (Maybe [Attribute] -> TaskDefinition)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x Object -> Text -> Parser (Maybe Text)
forall a. FromJSON a => Object -> Text -> Parser (Maybe a)
Core..:? Text
"cpu")
Parser (Maybe [Attribute] -> TaskDefinition)
-> Parser (Maybe [Attribute]) -> Parser TaskDefinition
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> ( Object
x Object -> Text -> Parser (Maybe (Maybe [Attribute]))
forall a. FromJSON a => Object -> Text -> Parser (Maybe a)
Core..:? Text
"requiresAttributes"
Parser (Maybe (Maybe [Attribute]))
-> Maybe [Attribute] -> Parser (Maybe [Attribute])
forall a. Parser (Maybe a) -> a -> Parser a
Core..!= Maybe [Attribute]
forall a. Monoid a => a
Prelude.mempty
)
)
instance Prelude.Hashable TaskDefinition
instance Prelude.NFData TaskDefinition