{-# 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 #-}

-- Derived from AWS service descriptions, licensed under Apache 2.0.

-- |
-- Module      : Amazonka.ECS.Types.ContainerService
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
module Amazonka.ECS.Types.ContainerService where

import qualified Amazonka.Core as Core
import qualified Amazonka.Core.Lens.Internal as Lens
import qualified Amazonka.Data as Data
import Amazonka.ECS.Types.CapacityProviderStrategyItem
import Amazonka.ECS.Types.Deployment
import Amazonka.ECS.Types.DeploymentConfiguration
import Amazonka.ECS.Types.DeploymentController
import Amazonka.ECS.Types.LaunchType
import Amazonka.ECS.Types.LoadBalancer
import Amazonka.ECS.Types.NetworkConfiguration
import Amazonka.ECS.Types.PlacementConstraint
import Amazonka.ECS.Types.PlacementStrategy
import Amazonka.ECS.Types.PropagateTags
import Amazonka.ECS.Types.SchedulingStrategy
import Amazonka.ECS.Types.ServiceEvent
import Amazonka.ECS.Types.ServiceRegistry
import Amazonka.ECS.Types.Tag
import Amazonka.ECS.Types.TaskSet
import qualified Amazonka.Prelude as Prelude

-- | Details on a service within a cluster
--
-- /See:/ 'newContainerService' smart constructor.
data ContainerService = ContainerService'
  { -- | The capacity provider strategy the service uses. When using the
    -- DescribeServices API, this field is omitted if the service was created
    -- using a launch type.
    ContainerService -> Maybe [CapacityProviderStrategyItem]
capacityProviderStrategy :: Prelude.Maybe [CapacityProviderStrategyItem],
    -- | The Amazon Resource Name (ARN) of the cluster that hosts the service.
    ContainerService -> Maybe Text
clusterArn :: Prelude.Maybe Prelude.Text,
    -- | The Unix timestamp for the time when the service was created.
    ContainerService -> Maybe POSIX
createdAt :: Prelude.Maybe Data.POSIX,
    -- | The principal that created the service.
    ContainerService -> Maybe Text
createdBy :: Prelude.Maybe Prelude.Text,
    -- | Optional deployment parameters that control how many tasks run during
    -- the deployment and the ordering of stopping and starting tasks.
    ContainerService -> Maybe DeploymentConfiguration
deploymentConfiguration :: Prelude.Maybe DeploymentConfiguration,
    -- | The deployment controller type the service is using.
    ContainerService -> Maybe DeploymentController
deploymentController :: Prelude.Maybe DeploymentController,
    -- | The current state of deployments for the service.
    ContainerService -> Maybe [Deployment]
deployments :: Prelude.Maybe [Deployment],
    -- | The desired number of instantiations of the task definition to keep
    -- running on the service. This value is specified when the service is
    -- created with CreateService, and it can be modified with UpdateService.
    ContainerService -> Maybe Int
desiredCount :: Prelude.Maybe Prelude.Int,
    -- | Determines whether to use Amazon ECS managed tags for the tasks in the
    -- service. For more information, see
    -- <https://docs.aws.amazon.com/AmazonECS/latest/developerguide/ecs-using-tags.html Tagging Your Amazon ECS Resources>
    -- in the /Amazon Elastic Container Service Developer Guide/.
    ContainerService -> Maybe Bool
enableECSManagedTags :: Prelude.Maybe Prelude.Bool,
    -- | Determines whether the execute command functionality is enabled for the
    -- service. If @true@, the execute command functionality is enabled for all
    -- containers in tasks as part of the service.
    ContainerService -> Maybe Bool
enableExecuteCommand :: Prelude.Maybe Prelude.Bool,
    -- | The event stream for your service. A maximum of 100 of the latest events
    -- are displayed.
    ContainerService -> Maybe [ServiceEvent]
events :: Prelude.Maybe [ServiceEvent],
    -- | The period of time, in seconds, that the Amazon ECS service scheduler
    -- ignores unhealthy Elastic Load Balancing target health checks after a
    -- task has first started.
    ContainerService -> Maybe Int
healthCheckGracePeriodSeconds :: Prelude.Maybe Prelude.Int,
    -- | The launch type the service is using. When using the DescribeServices
    -- API, this field is omitted if the service was created using a capacity
    -- provider strategy.
    ContainerService -> Maybe LaunchType
launchType :: Prelude.Maybe LaunchType,
    -- | A list of Elastic Load Balancing load balancer objects. It contains the
    -- load balancer name, the container name, and the container port to access
    -- from the load balancer. The container name is as it appears in a
    -- container definition.
    ContainerService -> Maybe [LoadBalancer]
loadBalancers :: Prelude.Maybe [LoadBalancer],
    -- | The VPC subnet and security group configuration for tasks that receive
    -- their own elastic network interface by using the @awsvpc@ networking
    -- mode.
    ContainerService -> Maybe NetworkConfiguration
networkConfiguration :: Prelude.Maybe NetworkConfiguration,
    -- | The number of tasks in the cluster that are in the @PENDING@ state.
    ContainerService -> Maybe Int
pendingCount :: Prelude.Maybe Prelude.Int,
    -- | The placement constraints for the tasks in the service.
    ContainerService -> Maybe [PlacementConstraint]
placementConstraints :: Prelude.Maybe [PlacementConstraint],
    -- | The placement strategy that determines how tasks for the service are
    -- placed.
    ContainerService -> Maybe [PlacementStrategy]
placementStrategy :: Prelude.Maybe [PlacementStrategy],
    -- | The operating system that your tasks in the service run on. A platform
    -- family is specified only for tasks using the Fargate launch type.
    --
    -- All tasks that run as part of this service must use the same
    -- @platformFamily@ value as the service (for example, @LINUX@).
    ContainerService -> Maybe Text
platformFamily :: Prelude.Maybe Prelude.Text,
    -- | The platform version to run your service on. A platform version is only
    -- specified for tasks that are hosted on Fargate. If one isn\'t specified,
    -- the @LATEST@ platform version is used. For more information, see
    -- <https://docs.aws.amazon.com/AmazonECS/latest/developerguide/platform_versions.html Fargate Platform Versions>
    -- in the /Amazon Elastic Container Service Developer Guide/.
    ContainerService -> Maybe Text
platformVersion :: Prelude.Maybe Prelude.Text,
    -- | Determines whether to propagate the tags from the task definition or the
    -- service to the task. If no value is specified, the tags aren\'t
    -- propagated.
    ContainerService -> Maybe PropagateTags
propagateTags :: Prelude.Maybe PropagateTags,
    -- | The ARN of the IAM role that\'s associated with the service. It allows
    -- the Amazon ECS container agent to register container instances with an
    -- Elastic Load Balancing load balancer.
    ContainerService -> Maybe Text
roleArn :: Prelude.Maybe Prelude.Text,
    -- | The number of tasks in the cluster that are in the @RUNNING@ state.
    ContainerService -> Maybe Int
runningCount :: Prelude.Maybe Prelude.Int,
    -- | The scheduling strategy to use for the service. For more information,
    -- see
    -- <https://docs.aws.amazon.com/AmazonECS/latest/developerguide/ecs_services.html Services>.
    --
    -- There are two service scheduler strategies available.
    --
    -- -   @REPLICA@-The replica scheduling strategy places and maintains the
    --     desired number of tasks across your cluster. By default, the service
    --     scheduler spreads tasks across Availability Zones. You can use task
    --     placement strategies and constraints to customize task placement
    --     decisions.
    --
    -- -   @DAEMON@-The daemon scheduling strategy deploys exactly one task on
    --     each active container instance. This task meets all of the task
    --     placement constraints that you specify in your cluster. The service
    --     scheduler also evaluates the task placement constraints for running
    --     tasks. It stop tasks that don\'t meet the placement constraints.
    --
    --     Fargate tasks don\'t support the @DAEMON@ scheduling strategy.
    ContainerService -> Maybe SchedulingStrategy
schedulingStrategy :: Prelude.Maybe SchedulingStrategy,
    -- | The ARN that identifies the service. For more information about the ARN
    -- format, see
    -- <https://docs.aws.amazon.com/AmazonECS/latest/developerguide/ecs-account-settings.html#ecs-resource-ids Amazon Resource Name (ARN)>
    -- in the /Amazon ECS Developer Guide/.
    ContainerService -> Maybe Text
serviceArn :: Prelude.Maybe Prelude.Text,
    -- | The name of your service. Up to 255 letters (uppercase and lowercase),
    -- numbers, underscores, and hyphens are allowed. Service names must be
    -- unique within a cluster. However, you can have similarly named services
    -- in multiple clusters within a Region or across multiple Regions.
    ContainerService -> Maybe Text
serviceName :: Prelude.Maybe Prelude.Text,
    -- | The details for the service discovery registries to assign to this
    -- service. For more information, see
    -- <https://docs.aws.amazon.com/AmazonECS/latest/developerguide/service-discovery.html Service Discovery>.
    ContainerService -> Maybe [ServiceRegistry]
serviceRegistries :: Prelude.Maybe [ServiceRegistry],
    -- | The status of the service. The valid values are @ACTIVE@, @DRAINING@, or
    -- @INACTIVE@.
    ContainerService -> Maybe Text
status :: Prelude.Maybe Prelude.Text,
    -- | The metadata that you apply to the service to help you categorize and
    -- organize them. Each tag consists of a key and an optional value. You
    -- define bot the key and value.
    --
    -- The following basic restrictions apply to tags:
    --
    -- -   Maximum number of tags per resource - 50
    --
    -- -   For each resource, each tag key must be unique, and each tag key can
    --     have only one value.
    --
    -- -   Maximum key length - 128 Unicode characters in UTF-8
    --
    -- -   Maximum value length - 256 Unicode characters in UTF-8
    --
    -- -   If your tagging schema is used across multiple services and
    --     resources, remember that other services may have restrictions on
    --     allowed characters. Generally allowed characters are: letters,
    --     numbers, and spaces representable in UTF-8, and the following
    --     characters: + - = . _ : \/ \@.
    --
    -- -   Tag keys and values are case-sensitive.
    --
    -- -   Do not use @aws:@, @AWS:@, or any upper or lowercase combination of
    --     such as a prefix for either keys or values as it is reserved for
    --     Amazon Web Services use. You cannot edit or delete tag keys or
    --     values with this prefix. Tags with this prefix do not count against
    --     your tags per resource limit.
    ContainerService -> Maybe [Tag]
tags :: Prelude.Maybe [Tag],
    -- | The task definition to use for tasks in the service. This value is
    -- specified when the service is created with CreateService, and it can be
    -- modified with UpdateService.
    ContainerService -> Maybe Text
taskDefinition :: Prelude.Maybe Prelude.Text,
    -- | Information about a set of Amazon ECS tasks in either an CodeDeploy or
    -- an @EXTERNAL@ deployment. An Amazon ECS task set includes details such
    -- as the desired number of tasks, how many tasks are running, and whether
    -- the task set serves production traffic.
    ContainerService -> Maybe [TaskSet]
taskSets :: Prelude.Maybe [TaskSet]
  }
  deriving (ContainerService -> ContainerService -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: ContainerService -> ContainerService -> Bool
$c/= :: ContainerService -> ContainerService -> Bool
== :: ContainerService -> ContainerService -> Bool
$c== :: ContainerService -> ContainerService -> Bool
Prelude.Eq, ReadPrec [ContainerService]
ReadPrec ContainerService
Int -> ReadS ContainerService
ReadS [ContainerService]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [ContainerService]
$creadListPrec :: ReadPrec [ContainerService]
readPrec :: ReadPrec ContainerService
$creadPrec :: ReadPrec ContainerService
readList :: ReadS [ContainerService]
$creadList :: ReadS [ContainerService]
readsPrec :: Int -> ReadS ContainerService
$creadsPrec :: Int -> ReadS ContainerService
Prelude.Read, Int -> ContainerService -> ShowS
[ContainerService] -> ShowS
ContainerService -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [ContainerService] -> ShowS
$cshowList :: [ContainerService] -> ShowS
show :: ContainerService -> String
$cshow :: ContainerService -> String
showsPrec :: Int -> ContainerService -> ShowS
$cshowsPrec :: Int -> ContainerService -> ShowS
Prelude.Show, forall x. Rep ContainerService x -> ContainerService
forall x. ContainerService -> Rep ContainerService x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep ContainerService x -> ContainerService
$cfrom :: forall x. ContainerService -> Rep ContainerService x
Prelude.Generic)

-- |
-- Create a value of 'ContainerService' with all optional fields omitted.
--
-- Use <https://hackage.haskell.org/package/generic-lens generic-lens> or <https://hackage.haskell.org/package/optics optics> to modify other optional fields.
--
-- The following record fields are available, with the corresponding lenses provided
-- for backwards compatibility:
--
-- 'capacityProviderStrategy', 'containerService_capacityProviderStrategy' - The capacity provider strategy the service uses. When using the
-- DescribeServices API, this field is omitted if the service was created
-- using a launch type.
--
-- 'clusterArn', 'containerService_clusterArn' - The Amazon Resource Name (ARN) of the cluster that hosts the service.
--
-- 'createdAt', 'containerService_createdAt' - The Unix timestamp for the time when the service was created.
--
-- 'createdBy', 'containerService_createdBy' - The principal that created the service.
--
-- 'deploymentConfiguration', 'containerService_deploymentConfiguration' - Optional deployment parameters that control how many tasks run during
-- the deployment and the ordering of stopping and starting tasks.
--
-- 'deploymentController', 'containerService_deploymentController' - The deployment controller type the service is using.
--
-- 'deployments', 'containerService_deployments' - The current state of deployments for the service.
--
-- 'desiredCount', 'containerService_desiredCount' - The desired number of instantiations of the task definition to keep
-- running on the service. This value is specified when the service is
-- created with CreateService, and it can be modified with UpdateService.
--
-- 'enableECSManagedTags', 'containerService_enableECSManagedTags' - Determines whether to use Amazon ECS managed tags for the tasks in the
-- service. For more information, see
-- <https://docs.aws.amazon.com/AmazonECS/latest/developerguide/ecs-using-tags.html Tagging Your Amazon ECS Resources>
-- in the /Amazon Elastic Container Service Developer Guide/.
--
-- 'enableExecuteCommand', 'containerService_enableExecuteCommand' - Determines whether the execute command functionality is enabled for the
-- service. If @true@, the execute command functionality is enabled for all
-- containers in tasks as part of the service.
--
-- 'events', 'containerService_events' - The event stream for your service. A maximum of 100 of the latest events
-- are displayed.
--
-- 'healthCheckGracePeriodSeconds', 'containerService_healthCheckGracePeriodSeconds' - The period of time, in seconds, that the Amazon ECS service scheduler
-- ignores unhealthy Elastic Load Balancing target health checks after a
-- task has first started.
--
-- 'launchType', 'containerService_launchType' - The launch type the service is using. When using the DescribeServices
-- API, this field is omitted if the service was created using a capacity
-- provider strategy.
--
-- 'loadBalancers', 'containerService_loadBalancers' - A list of Elastic Load Balancing load balancer objects. It contains the
-- load balancer name, the container name, and the container port to access
-- from the load balancer. The container name is as it appears in a
-- container definition.
--
-- 'networkConfiguration', 'containerService_networkConfiguration' - The VPC subnet and security group configuration for tasks that receive
-- their own elastic network interface by using the @awsvpc@ networking
-- mode.
--
-- 'pendingCount', 'containerService_pendingCount' - The number of tasks in the cluster that are in the @PENDING@ state.
--
-- 'placementConstraints', 'containerService_placementConstraints' - The placement constraints for the tasks in the service.
--
-- 'placementStrategy', 'containerService_placementStrategy' - The placement strategy that determines how tasks for the service are
-- placed.
--
-- 'platformFamily', 'containerService_platformFamily' - The operating system that your tasks in the service run on. A platform
-- family is specified only for tasks using the Fargate launch type.
--
-- All tasks that run as part of this service must use the same
-- @platformFamily@ value as the service (for example, @LINUX@).
--
-- 'platformVersion', 'containerService_platformVersion' - The platform version to run your service on. A platform version is only
-- specified for tasks that are hosted on Fargate. If one isn\'t specified,
-- the @LATEST@ platform version is used. For more information, see
-- <https://docs.aws.amazon.com/AmazonECS/latest/developerguide/platform_versions.html Fargate Platform Versions>
-- in the /Amazon Elastic Container Service Developer Guide/.
--
-- 'propagateTags', 'containerService_propagateTags' - Determines whether to propagate the tags from the task definition or the
-- service to the task. If no value is specified, the tags aren\'t
-- propagated.
--
-- 'roleArn', 'containerService_roleArn' - The ARN of the IAM role that\'s associated with the service. It allows
-- the Amazon ECS container agent to register container instances with an
-- Elastic Load Balancing load balancer.
--
-- 'runningCount', 'containerService_runningCount' - The number of tasks in the cluster that are in the @RUNNING@ state.
--
-- 'schedulingStrategy', 'containerService_schedulingStrategy' - The scheduling strategy to use for the service. For more information,
-- see
-- <https://docs.aws.amazon.com/AmazonECS/latest/developerguide/ecs_services.html Services>.
--
-- There are two service scheduler strategies available.
--
-- -   @REPLICA@-The replica scheduling strategy places and maintains the
--     desired number of tasks across your cluster. By default, the service
--     scheduler spreads tasks across Availability Zones. You can use task
--     placement strategies and constraints to customize task placement
--     decisions.
--
-- -   @DAEMON@-The daemon scheduling strategy deploys exactly one task on
--     each active container instance. This task meets all of the task
--     placement constraints that you specify in your cluster. The service
--     scheduler also evaluates the task placement constraints for running
--     tasks. It stop tasks that don\'t meet the placement constraints.
--
--     Fargate tasks don\'t support the @DAEMON@ scheduling strategy.
--
-- 'serviceArn', 'containerService_serviceArn' - The ARN that identifies the service. For more information about the ARN
-- format, see
-- <https://docs.aws.amazon.com/AmazonECS/latest/developerguide/ecs-account-settings.html#ecs-resource-ids Amazon Resource Name (ARN)>
-- in the /Amazon ECS Developer Guide/.
--
-- 'serviceName', 'containerService_serviceName' - The name of your service. Up to 255 letters (uppercase and lowercase),
-- numbers, underscores, and hyphens are allowed. Service names must be
-- unique within a cluster. However, you can have similarly named services
-- in multiple clusters within a Region or across multiple Regions.
--
-- 'serviceRegistries', 'containerService_serviceRegistries' - The details for the service discovery registries to assign to this
-- service. For more information, see
-- <https://docs.aws.amazon.com/AmazonECS/latest/developerguide/service-discovery.html Service Discovery>.
--
-- 'status', 'containerService_status' - The status of the service. The valid values are @ACTIVE@, @DRAINING@, or
-- @INACTIVE@.
--
-- 'tags', 'containerService_tags' - The metadata that you apply to the service to help you categorize and
-- organize them. Each tag consists of a key and an optional value. You
-- define bot the key and value.
--
-- The following basic restrictions apply to tags:
--
-- -   Maximum number of tags per resource - 50
--
-- -   For each resource, each tag key must be unique, and each tag key can
--     have only one value.
--
-- -   Maximum key length - 128 Unicode characters in UTF-8
--
-- -   Maximum value length - 256 Unicode characters in UTF-8
--
-- -   If your tagging schema is used across multiple services and
--     resources, remember that other services may have restrictions on
--     allowed characters. Generally allowed characters are: letters,
--     numbers, and spaces representable in UTF-8, and the following
--     characters: + - = . _ : \/ \@.
--
-- -   Tag keys and values are case-sensitive.
--
-- -   Do not use @aws:@, @AWS:@, or any upper or lowercase combination of
--     such as a prefix for either keys or values as it is reserved for
--     Amazon Web Services use. You cannot edit or delete tag keys or
--     values with this prefix. Tags with this prefix do not count against
--     your tags per resource limit.
--
-- 'taskDefinition', 'containerService_taskDefinition' - The task definition to use for tasks in the service. This value is
-- specified when the service is created with CreateService, and it can be
-- modified with UpdateService.
--
-- 'taskSets', 'containerService_taskSets' - Information about a set of Amazon ECS tasks in either an CodeDeploy or
-- an @EXTERNAL@ deployment. An Amazon ECS task set includes details such
-- as the desired number of tasks, how many tasks are running, and whether
-- the task set serves production traffic.
newContainerService ::
  ContainerService
newContainerService :: ContainerService
newContainerService =
  ContainerService'
    { $sel:capacityProviderStrategy:ContainerService' :: Maybe [CapacityProviderStrategyItem]
capacityProviderStrategy =
        forall a. Maybe a
Prelude.Nothing,
      $sel:clusterArn:ContainerService' :: Maybe Text
clusterArn = forall a. Maybe a
Prelude.Nothing,
      $sel:createdAt:ContainerService' :: Maybe POSIX
createdAt = forall a. Maybe a
Prelude.Nothing,
      $sel:createdBy:ContainerService' :: Maybe Text
createdBy = forall a. Maybe a
Prelude.Nothing,
      $sel:deploymentConfiguration:ContainerService' :: Maybe DeploymentConfiguration
deploymentConfiguration = forall a. Maybe a
Prelude.Nothing,
      $sel:deploymentController:ContainerService' :: Maybe DeploymentController
deploymentController = forall a. Maybe a
Prelude.Nothing,
      $sel:deployments:ContainerService' :: Maybe [Deployment]
deployments = forall a. Maybe a
Prelude.Nothing,
      $sel:desiredCount:ContainerService' :: Maybe Int
desiredCount = forall a. Maybe a
Prelude.Nothing,
      $sel:enableECSManagedTags:ContainerService' :: Maybe Bool
enableECSManagedTags = forall a. Maybe a
Prelude.Nothing,
      $sel:enableExecuteCommand:ContainerService' :: Maybe Bool
enableExecuteCommand = forall a. Maybe a
Prelude.Nothing,
      $sel:events:ContainerService' :: Maybe [ServiceEvent]
events = forall a. Maybe a
Prelude.Nothing,
      $sel:healthCheckGracePeriodSeconds:ContainerService' :: Maybe Int
healthCheckGracePeriodSeconds = forall a. Maybe a
Prelude.Nothing,
      $sel:launchType:ContainerService' :: Maybe LaunchType
launchType = forall a. Maybe a
Prelude.Nothing,
      $sel:loadBalancers:ContainerService' :: Maybe [LoadBalancer]
loadBalancers = forall a. Maybe a
Prelude.Nothing,
      $sel:networkConfiguration:ContainerService' :: Maybe NetworkConfiguration
networkConfiguration = forall a. Maybe a
Prelude.Nothing,
      $sel:pendingCount:ContainerService' :: Maybe Int
pendingCount = forall a. Maybe a
Prelude.Nothing,
      $sel:placementConstraints:ContainerService' :: Maybe [PlacementConstraint]
placementConstraints = forall a. Maybe a
Prelude.Nothing,
      $sel:placementStrategy:ContainerService' :: Maybe [PlacementStrategy]
placementStrategy = forall a. Maybe a
Prelude.Nothing,
      $sel:platformFamily:ContainerService' :: Maybe Text
platformFamily = forall a. Maybe a
Prelude.Nothing,
      $sel:platformVersion:ContainerService' :: Maybe Text
platformVersion = forall a. Maybe a
Prelude.Nothing,
      $sel:propagateTags:ContainerService' :: Maybe PropagateTags
propagateTags = forall a. Maybe a
Prelude.Nothing,
      $sel:roleArn:ContainerService' :: Maybe Text
roleArn = forall a. Maybe a
Prelude.Nothing,
      $sel:runningCount:ContainerService' :: Maybe Int
runningCount = forall a. Maybe a
Prelude.Nothing,
      $sel:schedulingStrategy:ContainerService' :: Maybe SchedulingStrategy
schedulingStrategy = forall a. Maybe a
Prelude.Nothing,
      $sel:serviceArn:ContainerService' :: Maybe Text
serviceArn = forall a. Maybe a
Prelude.Nothing,
      $sel:serviceName:ContainerService' :: Maybe Text
serviceName = forall a. Maybe a
Prelude.Nothing,
      $sel:serviceRegistries:ContainerService' :: Maybe [ServiceRegistry]
serviceRegistries = forall a. Maybe a
Prelude.Nothing,
      $sel:status:ContainerService' :: Maybe Text
status = forall a. Maybe a
Prelude.Nothing,
      $sel:tags:ContainerService' :: Maybe [Tag]
tags = forall a. Maybe a
Prelude.Nothing,
      $sel:taskDefinition:ContainerService' :: Maybe Text
taskDefinition = forall a. Maybe a
Prelude.Nothing,
      $sel:taskSets:ContainerService' :: Maybe [TaskSet]
taskSets = forall a. Maybe a
Prelude.Nothing
    }

-- | The capacity provider strategy the service uses. When using the
-- DescribeServices API, this field is omitted if the service was created
-- using a launch type.
containerService_capacityProviderStrategy :: Lens.Lens' ContainerService (Prelude.Maybe [CapacityProviderStrategyItem])
containerService_capacityProviderStrategy :: Lens' ContainerService (Maybe [CapacityProviderStrategyItem])
containerService_capacityProviderStrategy = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ContainerService' {Maybe [CapacityProviderStrategyItem]
capacityProviderStrategy :: Maybe [CapacityProviderStrategyItem]
$sel:capacityProviderStrategy:ContainerService' :: ContainerService -> Maybe [CapacityProviderStrategyItem]
capacityProviderStrategy} -> Maybe [CapacityProviderStrategyItem]
capacityProviderStrategy) (\s :: ContainerService
s@ContainerService' {} Maybe [CapacityProviderStrategyItem]
a -> ContainerService
s {$sel:capacityProviderStrategy:ContainerService' :: Maybe [CapacityProviderStrategyItem]
capacityProviderStrategy = Maybe [CapacityProviderStrategyItem]
a} :: ContainerService) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. 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 forall s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced

-- | The Amazon Resource Name (ARN) of the cluster that hosts the service.
containerService_clusterArn :: Lens.Lens' ContainerService (Prelude.Maybe Prelude.Text)
containerService_clusterArn :: Lens' ContainerService (Maybe Text)
containerService_clusterArn = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ContainerService' {Maybe Text
clusterArn :: Maybe Text
$sel:clusterArn:ContainerService' :: ContainerService -> Maybe Text
clusterArn} -> Maybe Text
clusterArn) (\s :: ContainerService
s@ContainerService' {} Maybe Text
a -> ContainerService
s {$sel:clusterArn:ContainerService' :: Maybe Text
clusterArn = Maybe Text
a} :: ContainerService)

-- | The Unix timestamp for the time when the service was created.
containerService_createdAt :: Lens.Lens' ContainerService (Prelude.Maybe Prelude.UTCTime)
containerService_createdAt :: Lens' ContainerService (Maybe UTCTime)
containerService_createdAt = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ContainerService' {Maybe POSIX
createdAt :: Maybe POSIX
$sel:createdAt:ContainerService' :: ContainerService -> Maybe POSIX
createdAt} -> Maybe POSIX
createdAt) (\s :: ContainerService
s@ContainerService' {} Maybe POSIX
a -> ContainerService
s {$sel:createdAt:ContainerService' :: Maybe POSIX
createdAt = Maybe POSIX
a} :: ContainerService) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. 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 forall (a :: Format). Iso' (Time a) UTCTime
Data._Time

-- | The principal that created the service.
containerService_createdBy :: Lens.Lens' ContainerService (Prelude.Maybe Prelude.Text)
containerService_createdBy :: Lens' ContainerService (Maybe Text)
containerService_createdBy = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ContainerService' {Maybe Text
createdBy :: Maybe Text
$sel:createdBy:ContainerService' :: ContainerService -> Maybe Text
createdBy} -> Maybe Text
createdBy) (\s :: ContainerService
s@ContainerService' {} Maybe Text
a -> ContainerService
s {$sel:createdBy:ContainerService' :: Maybe Text
createdBy = Maybe Text
a} :: ContainerService)

-- | Optional deployment parameters that control how many tasks run during
-- the deployment and the ordering of stopping and starting tasks.
containerService_deploymentConfiguration :: Lens.Lens' ContainerService (Prelude.Maybe DeploymentConfiguration)
containerService_deploymentConfiguration :: Lens' ContainerService (Maybe DeploymentConfiguration)
containerService_deploymentConfiguration = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ContainerService' {Maybe DeploymentConfiguration
deploymentConfiguration :: Maybe DeploymentConfiguration
$sel:deploymentConfiguration:ContainerService' :: ContainerService -> Maybe DeploymentConfiguration
deploymentConfiguration} -> Maybe DeploymentConfiguration
deploymentConfiguration) (\s :: ContainerService
s@ContainerService' {} Maybe DeploymentConfiguration
a -> ContainerService
s {$sel:deploymentConfiguration:ContainerService' :: Maybe DeploymentConfiguration
deploymentConfiguration = Maybe DeploymentConfiguration
a} :: ContainerService)

-- | The deployment controller type the service is using.
containerService_deploymentController :: Lens.Lens' ContainerService (Prelude.Maybe DeploymentController)
containerService_deploymentController :: Lens' ContainerService (Maybe DeploymentController)
containerService_deploymentController = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ContainerService' {Maybe DeploymentController
deploymentController :: Maybe DeploymentController
$sel:deploymentController:ContainerService' :: ContainerService -> Maybe DeploymentController
deploymentController} -> Maybe DeploymentController
deploymentController) (\s :: ContainerService
s@ContainerService' {} Maybe DeploymentController
a -> ContainerService
s {$sel:deploymentController:ContainerService' :: Maybe DeploymentController
deploymentController = Maybe DeploymentController
a} :: ContainerService)

-- | The current state of deployments for the service.
containerService_deployments :: Lens.Lens' ContainerService (Prelude.Maybe [Deployment])
containerService_deployments :: Lens' ContainerService (Maybe [Deployment])
containerService_deployments = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ContainerService' {Maybe [Deployment]
deployments :: Maybe [Deployment]
$sel:deployments:ContainerService' :: ContainerService -> Maybe [Deployment]
deployments} -> Maybe [Deployment]
deployments) (\s :: ContainerService
s@ContainerService' {} Maybe [Deployment]
a -> ContainerService
s {$sel:deployments:ContainerService' :: Maybe [Deployment]
deployments = Maybe [Deployment]
a} :: ContainerService) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. 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 forall s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced

-- | The desired number of instantiations of the task definition to keep
-- running on the service. This value is specified when the service is
-- created with CreateService, and it can be modified with UpdateService.
containerService_desiredCount :: Lens.Lens' ContainerService (Prelude.Maybe Prelude.Int)
containerService_desiredCount :: Lens' ContainerService (Maybe Int)
containerService_desiredCount = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ContainerService' {Maybe Int
desiredCount :: Maybe Int
$sel:desiredCount:ContainerService' :: ContainerService -> Maybe Int
desiredCount} -> Maybe Int
desiredCount) (\s :: ContainerService
s@ContainerService' {} Maybe Int
a -> ContainerService
s {$sel:desiredCount:ContainerService' :: Maybe Int
desiredCount = Maybe Int
a} :: ContainerService)

-- | Determines whether to use Amazon ECS managed tags for the tasks in the
-- service. For more information, see
-- <https://docs.aws.amazon.com/AmazonECS/latest/developerguide/ecs-using-tags.html Tagging Your Amazon ECS Resources>
-- in the /Amazon Elastic Container Service Developer Guide/.
containerService_enableECSManagedTags :: Lens.Lens' ContainerService (Prelude.Maybe Prelude.Bool)
containerService_enableECSManagedTags :: Lens' ContainerService (Maybe Bool)
containerService_enableECSManagedTags = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ContainerService' {Maybe Bool
enableECSManagedTags :: Maybe Bool
$sel:enableECSManagedTags:ContainerService' :: ContainerService -> Maybe Bool
enableECSManagedTags} -> Maybe Bool
enableECSManagedTags) (\s :: ContainerService
s@ContainerService' {} Maybe Bool
a -> ContainerService
s {$sel:enableECSManagedTags:ContainerService' :: Maybe Bool
enableECSManagedTags = Maybe Bool
a} :: ContainerService)

-- | Determines whether the execute command functionality is enabled for the
-- service. If @true@, the execute command functionality is enabled for all
-- containers in tasks as part of the service.
containerService_enableExecuteCommand :: Lens.Lens' ContainerService (Prelude.Maybe Prelude.Bool)
containerService_enableExecuteCommand :: Lens' ContainerService (Maybe Bool)
containerService_enableExecuteCommand = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ContainerService' {Maybe Bool
enableExecuteCommand :: Maybe Bool
$sel:enableExecuteCommand:ContainerService' :: ContainerService -> Maybe Bool
enableExecuteCommand} -> Maybe Bool
enableExecuteCommand) (\s :: ContainerService
s@ContainerService' {} Maybe Bool
a -> ContainerService
s {$sel:enableExecuteCommand:ContainerService' :: Maybe Bool
enableExecuteCommand = Maybe Bool
a} :: ContainerService)

-- | The event stream for your service. A maximum of 100 of the latest events
-- are displayed.
containerService_events :: Lens.Lens' ContainerService (Prelude.Maybe [ServiceEvent])
containerService_events :: Lens' ContainerService (Maybe [ServiceEvent])
containerService_events = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ContainerService' {Maybe [ServiceEvent]
events :: Maybe [ServiceEvent]
$sel:events:ContainerService' :: ContainerService -> Maybe [ServiceEvent]
events} -> Maybe [ServiceEvent]
events) (\s :: ContainerService
s@ContainerService' {} Maybe [ServiceEvent]
a -> ContainerService
s {$sel:events:ContainerService' :: Maybe [ServiceEvent]
events = Maybe [ServiceEvent]
a} :: ContainerService) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. 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 forall s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced

-- | The period of time, in seconds, that the Amazon ECS service scheduler
-- ignores unhealthy Elastic Load Balancing target health checks after a
-- task has first started.
containerService_healthCheckGracePeriodSeconds :: Lens.Lens' ContainerService (Prelude.Maybe Prelude.Int)
containerService_healthCheckGracePeriodSeconds :: Lens' ContainerService (Maybe Int)
containerService_healthCheckGracePeriodSeconds = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ContainerService' {Maybe Int
healthCheckGracePeriodSeconds :: Maybe Int
$sel:healthCheckGracePeriodSeconds:ContainerService' :: ContainerService -> Maybe Int
healthCheckGracePeriodSeconds} -> Maybe Int
healthCheckGracePeriodSeconds) (\s :: ContainerService
s@ContainerService' {} Maybe Int
a -> ContainerService
s {$sel:healthCheckGracePeriodSeconds:ContainerService' :: Maybe Int
healthCheckGracePeriodSeconds = Maybe Int
a} :: ContainerService)

-- | The launch type the service is using. When using the DescribeServices
-- API, this field is omitted if the service was created using a capacity
-- provider strategy.
containerService_launchType :: Lens.Lens' ContainerService (Prelude.Maybe LaunchType)
containerService_launchType :: Lens' ContainerService (Maybe LaunchType)
containerService_launchType = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ContainerService' {Maybe LaunchType
launchType :: Maybe LaunchType
$sel:launchType:ContainerService' :: ContainerService -> Maybe LaunchType
launchType} -> Maybe LaunchType
launchType) (\s :: ContainerService
s@ContainerService' {} Maybe LaunchType
a -> ContainerService
s {$sel:launchType:ContainerService' :: Maybe LaunchType
launchType = Maybe LaunchType
a} :: ContainerService)

-- | A list of Elastic Load Balancing load balancer objects. It contains the
-- load balancer name, the container name, and the container port to access
-- from the load balancer. The container name is as it appears in a
-- container definition.
containerService_loadBalancers :: Lens.Lens' ContainerService (Prelude.Maybe [LoadBalancer])
containerService_loadBalancers :: Lens' ContainerService (Maybe [LoadBalancer])
containerService_loadBalancers = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ContainerService' {Maybe [LoadBalancer]
loadBalancers :: Maybe [LoadBalancer]
$sel:loadBalancers:ContainerService' :: ContainerService -> Maybe [LoadBalancer]
loadBalancers} -> Maybe [LoadBalancer]
loadBalancers) (\s :: ContainerService
s@ContainerService' {} Maybe [LoadBalancer]
a -> ContainerService
s {$sel:loadBalancers:ContainerService' :: Maybe [LoadBalancer]
loadBalancers = Maybe [LoadBalancer]
a} :: ContainerService) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. 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 forall s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced

-- | The VPC subnet and security group configuration for tasks that receive
-- their own elastic network interface by using the @awsvpc@ networking
-- mode.
containerService_networkConfiguration :: Lens.Lens' ContainerService (Prelude.Maybe NetworkConfiguration)
containerService_networkConfiguration :: Lens' ContainerService (Maybe NetworkConfiguration)
containerService_networkConfiguration = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ContainerService' {Maybe NetworkConfiguration
networkConfiguration :: Maybe NetworkConfiguration
$sel:networkConfiguration:ContainerService' :: ContainerService -> Maybe NetworkConfiguration
networkConfiguration} -> Maybe NetworkConfiguration
networkConfiguration) (\s :: ContainerService
s@ContainerService' {} Maybe NetworkConfiguration
a -> ContainerService
s {$sel:networkConfiguration:ContainerService' :: Maybe NetworkConfiguration
networkConfiguration = Maybe NetworkConfiguration
a} :: ContainerService)

-- | The number of tasks in the cluster that are in the @PENDING@ state.
containerService_pendingCount :: Lens.Lens' ContainerService (Prelude.Maybe Prelude.Int)
containerService_pendingCount :: Lens' ContainerService (Maybe Int)
containerService_pendingCount = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ContainerService' {Maybe Int
pendingCount :: Maybe Int
$sel:pendingCount:ContainerService' :: ContainerService -> Maybe Int
pendingCount} -> Maybe Int
pendingCount) (\s :: ContainerService
s@ContainerService' {} Maybe Int
a -> ContainerService
s {$sel:pendingCount:ContainerService' :: Maybe Int
pendingCount = Maybe Int
a} :: ContainerService)

-- | The placement constraints for the tasks in the service.
containerService_placementConstraints :: Lens.Lens' ContainerService (Prelude.Maybe [PlacementConstraint])
containerService_placementConstraints :: Lens' ContainerService (Maybe [PlacementConstraint])
containerService_placementConstraints = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ContainerService' {Maybe [PlacementConstraint]
placementConstraints :: Maybe [PlacementConstraint]
$sel:placementConstraints:ContainerService' :: ContainerService -> Maybe [PlacementConstraint]
placementConstraints} -> Maybe [PlacementConstraint]
placementConstraints) (\s :: ContainerService
s@ContainerService' {} Maybe [PlacementConstraint]
a -> ContainerService
s {$sel:placementConstraints:ContainerService' :: Maybe [PlacementConstraint]
placementConstraints = Maybe [PlacementConstraint]
a} :: ContainerService) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. 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 forall s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced

-- | The placement strategy that determines how tasks for the service are
-- placed.
containerService_placementStrategy :: Lens.Lens' ContainerService (Prelude.Maybe [PlacementStrategy])
containerService_placementStrategy :: Lens' ContainerService (Maybe [PlacementStrategy])
containerService_placementStrategy = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ContainerService' {Maybe [PlacementStrategy]
placementStrategy :: Maybe [PlacementStrategy]
$sel:placementStrategy:ContainerService' :: ContainerService -> Maybe [PlacementStrategy]
placementStrategy} -> Maybe [PlacementStrategy]
placementStrategy) (\s :: ContainerService
s@ContainerService' {} Maybe [PlacementStrategy]
a -> ContainerService
s {$sel:placementStrategy:ContainerService' :: Maybe [PlacementStrategy]
placementStrategy = Maybe [PlacementStrategy]
a} :: ContainerService) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. 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 forall s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced

-- | The operating system that your tasks in the service run on. A platform
-- family is specified only for tasks using the Fargate launch type.
--
-- All tasks that run as part of this service must use the same
-- @platformFamily@ value as the service (for example, @LINUX@).
containerService_platformFamily :: Lens.Lens' ContainerService (Prelude.Maybe Prelude.Text)
containerService_platformFamily :: Lens' ContainerService (Maybe Text)
containerService_platformFamily = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ContainerService' {Maybe Text
platformFamily :: Maybe Text
$sel:platformFamily:ContainerService' :: ContainerService -> Maybe Text
platformFamily} -> Maybe Text
platformFamily) (\s :: ContainerService
s@ContainerService' {} Maybe Text
a -> ContainerService
s {$sel:platformFamily:ContainerService' :: Maybe Text
platformFamily = Maybe Text
a} :: ContainerService)

-- | The platform version to run your service on. A platform version is only
-- specified for tasks that are hosted on Fargate. If one isn\'t specified,
-- the @LATEST@ platform version is used. For more information, see
-- <https://docs.aws.amazon.com/AmazonECS/latest/developerguide/platform_versions.html Fargate Platform Versions>
-- in the /Amazon Elastic Container Service Developer Guide/.
containerService_platformVersion :: Lens.Lens' ContainerService (Prelude.Maybe Prelude.Text)
containerService_platformVersion :: Lens' ContainerService (Maybe Text)
containerService_platformVersion = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ContainerService' {Maybe Text
platformVersion :: Maybe Text
$sel:platformVersion:ContainerService' :: ContainerService -> Maybe Text
platformVersion} -> Maybe Text
platformVersion) (\s :: ContainerService
s@ContainerService' {} Maybe Text
a -> ContainerService
s {$sel:platformVersion:ContainerService' :: Maybe Text
platformVersion = Maybe Text
a} :: ContainerService)

-- | Determines whether to propagate the tags from the task definition or the
-- service to the task. If no value is specified, the tags aren\'t
-- propagated.
containerService_propagateTags :: Lens.Lens' ContainerService (Prelude.Maybe PropagateTags)
containerService_propagateTags :: Lens' ContainerService (Maybe PropagateTags)
containerService_propagateTags = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ContainerService' {Maybe PropagateTags
propagateTags :: Maybe PropagateTags
$sel:propagateTags:ContainerService' :: ContainerService -> Maybe PropagateTags
propagateTags} -> Maybe PropagateTags
propagateTags) (\s :: ContainerService
s@ContainerService' {} Maybe PropagateTags
a -> ContainerService
s {$sel:propagateTags:ContainerService' :: Maybe PropagateTags
propagateTags = Maybe PropagateTags
a} :: ContainerService)

-- | The ARN of the IAM role that\'s associated with the service. It allows
-- the Amazon ECS container agent to register container instances with an
-- Elastic Load Balancing load balancer.
containerService_roleArn :: Lens.Lens' ContainerService (Prelude.Maybe Prelude.Text)
containerService_roleArn :: Lens' ContainerService (Maybe Text)
containerService_roleArn = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ContainerService' {Maybe Text
roleArn :: Maybe Text
$sel:roleArn:ContainerService' :: ContainerService -> Maybe Text
roleArn} -> Maybe Text
roleArn) (\s :: ContainerService
s@ContainerService' {} Maybe Text
a -> ContainerService
s {$sel:roleArn:ContainerService' :: Maybe Text
roleArn = Maybe Text
a} :: ContainerService)

-- | The number of tasks in the cluster that are in the @RUNNING@ state.
containerService_runningCount :: Lens.Lens' ContainerService (Prelude.Maybe Prelude.Int)
containerService_runningCount :: Lens' ContainerService (Maybe Int)
containerService_runningCount = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ContainerService' {Maybe Int
runningCount :: Maybe Int
$sel:runningCount:ContainerService' :: ContainerService -> Maybe Int
runningCount} -> Maybe Int
runningCount) (\s :: ContainerService
s@ContainerService' {} Maybe Int
a -> ContainerService
s {$sel:runningCount:ContainerService' :: Maybe Int
runningCount = Maybe Int
a} :: ContainerService)

-- | The scheduling strategy to use for the service. For more information,
-- see
-- <https://docs.aws.amazon.com/AmazonECS/latest/developerguide/ecs_services.html Services>.
--
-- There are two service scheduler strategies available.
--
-- -   @REPLICA@-The replica scheduling strategy places and maintains the
--     desired number of tasks across your cluster. By default, the service
--     scheduler spreads tasks across Availability Zones. You can use task
--     placement strategies and constraints to customize task placement
--     decisions.
--
-- -   @DAEMON@-The daemon scheduling strategy deploys exactly one task on
--     each active container instance. This task meets all of the task
--     placement constraints that you specify in your cluster. The service
--     scheduler also evaluates the task placement constraints for running
--     tasks. It stop tasks that don\'t meet the placement constraints.
--
--     Fargate tasks don\'t support the @DAEMON@ scheduling strategy.
containerService_schedulingStrategy :: Lens.Lens' ContainerService (Prelude.Maybe SchedulingStrategy)
containerService_schedulingStrategy :: Lens' ContainerService (Maybe SchedulingStrategy)
containerService_schedulingStrategy = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ContainerService' {Maybe SchedulingStrategy
schedulingStrategy :: Maybe SchedulingStrategy
$sel:schedulingStrategy:ContainerService' :: ContainerService -> Maybe SchedulingStrategy
schedulingStrategy} -> Maybe SchedulingStrategy
schedulingStrategy) (\s :: ContainerService
s@ContainerService' {} Maybe SchedulingStrategy
a -> ContainerService
s {$sel:schedulingStrategy:ContainerService' :: Maybe SchedulingStrategy
schedulingStrategy = Maybe SchedulingStrategy
a} :: ContainerService)

-- | The ARN that identifies the service. For more information about the ARN
-- format, see
-- <https://docs.aws.amazon.com/AmazonECS/latest/developerguide/ecs-account-settings.html#ecs-resource-ids Amazon Resource Name (ARN)>
-- in the /Amazon ECS Developer Guide/.
containerService_serviceArn :: Lens.Lens' ContainerService (Prelude.Maybe Prelude.Text)
containerService_serviceArn :: Lens' ContainerService (Maybe Text)
containerService_serviceArn = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ContainerService' {Maybe Text
serviceArn :: Maybe Text
$sel:serviceArn:ContainerService' :: ContainerService -> Maybe Text
serviceArn} -> Maybe Text
serviceArn) (\s :: ContainerService
s@ContainerService' {} Maybe Text
a -> ContainerService
s {$sel:serviceArn:ContainerService' :: Maybe Text
serviceArn = Maybe Text
a} :: ContainerService)

-- | The name of your service. Up to 255 letters (uppercase and lowercase),
-- numbers, underscores, and hyphens are allowed. Service names must be
-- unique within a cluster. However, you can have similarly named services
-- in multiple clusters within a Region or across multiple Regions.
containerService_serviceName :: Lens.Lens' ContainerService (Prelude.Maybe Prelude.Text)
containerService_serviceName :: Lens' ContainerService (Maybe Text)
containerService_serviceName = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ContainerService' {Maybe Text
serviceName :: Maybe Text
$sel:serviceName:ContainerService' :: ContainerService -> Maybe Text
serviceName} -> Maybe Text
serviceName) (\s :: ContainerService
s@ContainerService' {} Maybe Text
a -> ContainerService
s {$sel:serviceName:ContainerService' :: Maybe Text
serviceName = Maybe Text
a} :: ContainerService)

-- | The details for the service discovery registries to assign to this
-- service. For more information, see
-- <https://docs.aws.amazon.com/AmazonECS/latest/developerguide/service-discovery.html Service Discovery>.
containerService_serviceRegistries :: Lens.Lens' ContainerService (Prelude.Maybe [ServiceRegistry])
containerService_serviceRegistries :: Lens' ContainerService (Maybe [ServiceRegistry])
containerService_serviceRegistries = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ContainerService' {Maybe [ServiceRegistry]
serviceRegistries :: Maybe [ServiceRegistry]
$sel:serviceRegistries:ContainerService' :: ContainerService -> Maybe [ServiceRegistry]
serviceRegistries} -> Maybe [ServiceRegistry]
serviceRegistries) (\s :: ContainerService
s@ContainerService' {} Maybe [ServiceRegistry]
a -> ContainerService
s {$sel:serviceRegistries:ContainerService' :: Maybe [ServiceRegistry]
serviceRegistries = Maybe [ServiceRegistry]
a} :: ContainerService) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. 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 forall s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced

-- | The status of the service. The valid values are @ACTIVE@, @DRAINING@, or
-- @INACTIVE@.
containerService_status :: Lens.Lens' ContainerService (Prelude.Maybe Prelude.Text)
containerService_status :: Lens' ContainerService (Maybe Text)
containerService_status = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ContainerService' {Maybe Text
status :: Maybe Text
$sel:status:ContainerService' :: ContainerService -> Maybe Text
status} -> Maybe Text
status) (\s :: ContainerService
s@ContainerService' {} Maybe Text
a -> ContainerService
s {$sel:status:ContainerService' :: Maybe Text
status = Maybe Text
a} :: ContainerService)

-- | The metadata that you apply to the service to help you categorize and
-- organize them. Each tag consists of a key and an optional value. You
-- define bot the key and value.
--
-- The following basic restrictions apply to tags:
--
-- -   Maximum number of tags per resource - 50
--
-- -   For each resource, each tag key must be unique, and each tag key can
--     have only one value.
--
-- -   Maximum key length - 128 Unicode characters in UTF-8
--
-- -   Maximum value length - 256 Unicode characters in UTF-8
--
-- -   If your tagging schema is used across multiple services and
--     resources, remember that other services may have restrictions on
--     allowed characters. Generally allowed characters are: letters,
--     numbers, and spaces representable in UTF-8, and the following
--     characters: + - = . _ : \/ \@.
--
-- -   Tag keys and values are case-sensitive.
--
-- -   Do not use @aws:@, @AWS:@, or any upper or lowercase combination of
--     such as a prefix for either keys or values as it is reserved for
--     Amazon Web Services use. You cannot edit or delete tag keys or
--     values with this prefix. Tags with this prefix do not count against
--     your tags per resource limit.
containerService_tags :: Lens.Lens' ContainerService (Prelude.Maybe [Tag])
containerService_tags :: Lens' ContainerService (Maybe [Tag])
containerService_tags = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ContainerService' {Maybe [Tag]
tags :: Maybe [Tag]
$sel:tags:ContainerService' :: ContainerService -> Maybe [Tag]
tags} -> Maybe [Tag]
tags) (\s :: ContainerService
s@ContainerService' {} Maybe [Tag]
a -> ContainerService
s {$sel:tags:ContainerService' :: Maybe [Tag]
tags = Maybe [Tag]
a} :: ContainerService) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. 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 forall s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced

-- | The task definition to use for tasks in the service. This value is
-- specified when the service is created with CreateService, and it can be
-- modified with UpdateService.
containerService_taskDefinition :: Lens.Lens' ContainerService (Prelude.Maybe Prelude.Text)
containerService_taskDefinition :: Lens' ContainerService (Maybe Text)
containerService_taskDefinition = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ContainerService' {Maybe Text
taskDefinition :: Maybe Text
$sel:taskDefinition:ContainerService' :: ContainerService -> Maybe Text
taskDefinition} -> Maybe Text
taskDefinition) (\s :: ContainerService
s@ContainerService' {} Maybe Text
a -> ContainerService
s {$sel:taskDefinition:ContainerService' :: Maybe Text
taskDefinition = Maybe Text
a} :: ContainerService)

-- | Information about a set of Amazon ECS tasks in either an CodeDeploy or
-- an @EXTERNAL@ deployment. An Amazon ECS task set includes details such
-- as the desired number of tasks, how many tasks are running, and whether
-- the task set serves production traffic.
containerService_taskSets :: Lens.Lens' ContainerService (Prelude.Maybe [TaskSet])
containerService_taskSets :: Lens' ContainerService (Maybe [TaskSet])
containerService_taskSets = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ContainerService' {Maybe [TaskSet]
taskSets :: Maybe [TaskSet]
$sel:taskSets:ContainerService' :: ContainerService -> Maybe [TaskSet]
taskSets} -> Maybe [TaskSet]
taskSets) (\s :: ContainerService
s@ContainerService' {} Maybe [TaskSet]
a -> ContainerService
s {$sel:taskSets:ContainerService' :: Maybe [TaskSet]
taskSets = Maybe [TaskSet]
a} :: ContainerService) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. 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 forall s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced

instance Data.FromJSON ContainerService where
  parseJSON :: Value -> Parser ContainerService
parseJSON =
    forall a. String -> (Object -> Parser a) -> Value -> Parser a
Data.withObject
      String
"ContainerService"
      ( \Object
x ->
          Maybe [CapacityProviderStrategyItem]
-> Maybe Text
-> Maybe POSIX
-> Maybe Text
-> Maybe DeploymentConfiguration
-> Maybe DeploymentController
-> Maybe [Deployment]
-> Maybe Int
-> Maybe Bool
-> Maybe Bool
-> Maybe [ServiceEvent]
-> Maybe Int
-> Maybe LaunchType
-> Maybe [LoadBalancer]
-> Maybe NetworkConfiguration
-> Maybe Int
-> Maybe [PlacementConstraint]
-> Maybe [PlacementStrategy]
-> Maybe Text
-> Maybe Text
-> Maybe PropagateTags
-> Maybe Text
-> Maybe Int
-> Maybe SchedulingStrategy
-> Maybe Text
-> Maybe Text
-> Maybe [ServiceRegistry]
-> Maybe Text
-> Maybe [Tag]
-> Maybe Text
-> Maybe [TaskSet]
-> ContainerService
ContainerService'
            forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> ( Object
x
                            forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"capacityProviderStrategy"
                            forall a. Parser (Maybe a) -> a -> Parser a
Data..!= forall a. Monoid a => a
Prelude.mempty
                        )
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"clusterArn")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"createdAt")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"createdBy")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"deploymentConfiguration")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"deploymentController")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"deployments" forall a. Parser (Maybe a) -> a -> Parser a
Data..!= forall a. Monoid a => a
Prelude.mempty)
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"desiredCount")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"enableECSManagedTags")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"enableExecuteCommand")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"events" forall a. Parser (Maybe a) -> a -> Parser a
Data..!= forall a. Monoid a => a
Prelude.mempty)
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"healthCheckGracePeriodSeconds")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"launchType")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"loadBalancers" forall a. Parser (Maybe a) -> a -> Parser a
Data..!= forall a. Monoid a => a
Prelude.mempty)
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"networkConfiguration")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"pendingCount")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> ( Object
x
                            forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"placementConstraints"
                            forall a. Parser (Maybe a) -> a -> Parser a
Data..!= forall a. Monoid a => a
Prelude.mempty
                        )
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> ( Object
x
                            forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"placementStrategy"
                            forall a. Parser (Maybe a) -> a -> Parser a
Data..!= forall a. Monoid a => a
Prelude.mempty
                        )
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"platformFamily")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"platformVersion")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"propagateTags")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"roleArn")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"runningCount")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"schedulingStrategy")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"serviceArn")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"serviceName")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> ( Object
x
                            forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"serviceRegistries"
                            forall a. Parser (Maybe a) -> a -> Parser a
Data..!= forall a. Monoid a => a
Prelude.mempty
                        )
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"status")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"tags" forall a. Parser (Maybe a) -> a -> Parser a
Data..!= forall a. Monoid a => a
Prelude.mempty)
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"taskDefinition")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"taskSets" forall a. Parser (Maybe a) -> a -> Parser a
Data..!= forall a. Monoid a => a
Prelude.mempty)
      )

instance Prelude.Hashable ContainerService where
  hashWithSalt :: Int -> ContainerService -> Int
hashWithSalt Int
_salt ContainerService' {Maybe Bool
Maybe Int
Maybe [CapacityProviderStrategyItem]
Maybe [LoadBalancer]
Maybe [PlacementConstraint]
Maybe [PlacementStrategy]
Maybe [Deployment]
Maybe [ServiceEvent]
Maybe [ServiceRegistry]
Maybe [Tag]
Maybe [TaskSet]
Maybe Text
Maybe POSIX
Maybe DeploymentConfiguration
Maybe DeploymentController
Maybe LaunchType
Maybe NetworkConfiguration
Maybe PropagateTags
Maybe SchedulingStrategy
taskSets :: Maybe [TaskSet]
taskDefinition :: Maybe Text
tags :: Maybe [Tag]
status :: Maybe Text
serviceRegistries :: Maybe [ServiceRegistry]
serviceName :: Maybe Text
serviceArn :: Maybe Text
schedulingStrategy :: Maybe SchedulingStrategy
runningCount :: Maybe Int
roleArn :: Maybe Text
propagateTags :: Maybe PropagateTags
platformVersion :: Maybe Text
platformFamily :: Maybe Text
placementStrategy :: Maybe [PlacementStrategy]
placementConstraints :: Maybe [PlacementConstraint]
pendingCount :: Maybe Int
networkConfiguration :: Maybe NetworkConfiguration
loadBalancers :: Maybe [LoadBalancer]
launchType :: Maybe LaunchType
healthCheckGracePeriodSeconds :: Maybe Int
events :: Maybe [ServiceEvent]
enableExecuteCommand :: Maybe Bool
enableECSManagedTags :: Maybe Bool
desiredCount :: Maybe Int
deployments :: Maybe [Deployment]
deploymentController :: Maybe DeploymentController
deploymentConfiguration :: Maybe DeploymentConfiguration
createdBy :: Maybe Text
createdAt :: Maybe POSIX
clusterArn :: Maybe Text
capacityProviderStrategy :: Maybe [CapacityProviderStrategyItem]
$sel:taskSets:ContainerService' :: ContainerService -> Maybe [TaskSet]
$sel:taskDefinition:ContainerService' :: ContainerService -> Maybe Text
$sel:tags:ContainerService' :: ContainerService -> Maybe [Tag]
$sel:status:ContainerService' :: ContainerService -> Maybe Text
$sel:serviceRegistries:ContainerService' :: ContainerService -> Maybe [ServiceRegistry]
$sel:serviceName:ContainerService' :: ContainerService -> Maybe Text
$sel:serviceArn:ContainerService' :: ContainerService -> Maybe Text
$sel:schedulingStrategy:ContainerService' :: ContainerService -> Maybe SchedulingStrategy
$sel:runningCount:ContainerService' :: ContainerService -> Maybe Int
$sel:roleArn:ContainerService' :: ContainerService -> Maybe Text
$sel:propagateTags:ContainerService' :: ContainerService -> Maybe PropagateTags
$sel:platformVersion:ContainerService' :: ContainerService -> Maybe Text
$sel:platformFamily:ContainerService' :: ContainerService -> Maybe Text
$sel:placementStrategy:ContainerService' :: ContainerService -> Maybe [PlacementStrategy]
$sel:placementConstraints:ContainerService' :: ContainerService -> Maybe [PlacementConstraint]
$sel:pendingCount:ContainerService' :: ContainerService -> Maybe Int
$sel:networkConfiguration:ContainerService' :: ContainerService -> Maybe NetworkConfiguration
$sel:loadBalancers:ContainerService' :: ContainerService -> Maybe [LoadBalancer]
$sel:launchType:ContainerService' :: ContainerService -> Maybe LaunchType
$sel:healthCheckGracePeriodSeconds:ContainerService' :: ContainerService -> Maybe Int
$sel:events:ContainerService' :: ContainerService -> Maybe [ServiceEvent]
$sel:enableExecuteCommand:ContainerService' :: ContainerService -> Maybe Bool
$sel:enableECSManagedTags:ContainerService' :: ContainerService -> Maybe Bool
$sel:desiredCount:ContainerService' :: ContainerService -> Maybe Int
$sel:deployments:ContainerService' :: ContainerService -> Maybe [Deployment]
$sel:deploymentController:ContainerService' :: ContainerService -> Maybe DeploymentController
$sel:deploymentConfiguration:ContainerService' :: ContainerService -> Maybe DeploymentConfiguration
$sel:createdBy:ContainerService' :: ContainerService -> Maybe Text
$sel:createdAt:ContainerService' :: ContainerService -> Maybe POSIX
$sel:clusterArn:ContainerService' :: ContainerService -> Maybe Text
$sel:capacityProviderStrategy:ContainerService' :: ContainerService -> Maybe [CapacityProviderStrategyItem]
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe [CapacityProviderStrategyItem]
capacityProviderStrategy
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
clusterArn
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe POSIX
createdAt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
createdBy
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe DeploymentConfiguration
deploymentConfiguration
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe DeploymentController
deploymentController
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe [Deployment]
deployments
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Int
desiredCount
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Bool
enableECSManagedTags
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Bool
enableExecuteCommand
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe [ServiceEvent]
events
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Int
healthCheckGracePeriodSeconds
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe LaunchType
launchType
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe [LoadBalancer]
loadBalancers
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe NetworkConfiguration
networkConfiguration
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Int
pendingCount
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe [PlacementConstraint]
placementConstraints
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe [PlacementStrategy]
placementStrategy
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
platformFamily
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
platformVersion
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe PropagateTags
propagateTags
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
roleArn
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Int
runningCount
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe SchedulingStrategy
schedulingStrategy
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
serviceArn
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
serviceName
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe [ServiceRegistry]
serviceRegistries
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
status
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe [Tag]
tags
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
taskDefinition
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe [TaskSet]
taskSets

instance Prelude.NFData ContainerService where
  rnf :: ContainerService -> ()
rnf ContainerService' {Maybe Bool
Maybe Int
Maybe [CapacityProviderStrategyItem]
Maybe [LoadBalancer]
Maybe [PlacementConstraint]
Maybe [PlacementStrategy]
Maybe [Deployment]
Maybe [ServiceEvent]
Maybe [ServiceRegistry]
Maybe [Tag]
Maybe [TaskSet]
Maybe Text
Maybe POSIX
Maybe DeploymentConfiguration
Maybe DeploymentController
Maybe LaunchType
Maybe NetworkConfiguration
Maybe PropagateTags
Maybe SchedulingStrategy
taskSets :: Maybe [TaskSet]
taskDefinition :: Maybe Text
tags :: Maybe [Tag]
status :: Maybe Text
serviceRegistries :: Maybe [ServiceRegistry]
serviceName :: Maybe Text
serviceArn :: Maybe Text
schedulingStrategy :: Maybe SchedulingStrategy
runningCount :: Maybe Int
roleArn :: Maybe Text
propagateTags :: Maybe PropagateTags
platformVersion :: Maybe Text
platformFamily :: Maybe Text
placementStrategy :: Maybe [PlacementStrategy]
placementConstraints :: Maybe [PlacementConstraint]
pendingCount :: Maybe Int
networkConfiguration :: Maybe NetworkConfiguration
loadBalancers :: Maybe [LoadBalancer]
launchType :: Maybe LaunchType
healthCheckGracePeriodSeconds :: Maybe Int
events :: Maybe [ServiceEvent]
enableExecuteCommand :: Maybe Bool
enableECSManagedTags :: Maybe Bool
desiredCount :: Maybe Int
deployments :: Maybe [Deployment]
deploymentController :: Maybe DeploymentController
deploymentConfiguration :: Maybe DeploymentConfiguration
createdBy :: Maybe Text
createdAt :: Maybe POSIX
clusterArn :: Maybe Text
capacityProviderStrategy :: Maybe [CapacityProviderStrategyItem]
$sel:taskSets:ContainerService' :: ContainerService -> Maybe [TaskSet]
$sel:taskDefinition:ContainerService' :: ContainerService -> Maybe Text
$sel:tags:ContainerService' :: ContainerService -> Maybe [Tag]
$sel:status:ContainerService' :: ContainerService -> Maybe Text
$sel:serviceRegistries:ContainerService' :: ContainerService -> Maybe [ServiceRegistry]
$sel:serviceName:ContainerService' :: ContainerService -> Maybe Text
$sel:serviceArn:ContainerService' :: ContainerService -> Maybe Text
$sel:schedulingStrategy:ContainerService' :: ContainerService -> Maybe SchedulingStrategy
$sel:runningCount:ContainerService' :: ContainerService -> Maybe Int
$sel:roleArn:ContainerService' :: ContainerService -> Maybe Text
$sel:propagateTags:ContainerService' :: ContainerService -> Maybe PropagateTags
$sel:platformVersion:ContainerService' :: ContainerService -> Maybe Text
$sel:platformFamily:ContainerService' :: ContainerService -> Maybe Text
$sel:placementStrategy:ContainerService' :: ContainerService -> Maybe [PlacementStrategy]
$sel:placementConstraints:ContainerService' :: ContainerService -> Maybe [PlacementConstraint]
$sel:pendingCount:ContainerService' :: ContainerService -> Maybe Int
$sel:networkConfiguration:ContainerService' :: ContainerService -> Maybe NetworkConfiguration
$sel:loadBalancers:ContainerService' :: ContainerService -> Maybe [LoadBalancer]
$sel:launchType:ContainerService' :: ContainerService -> Maybe LaunchType
$sel:healthCheckGracePeriodSeconds:ContainerService' :: ContainerService -> Maybe Int
$sel:events:ContainerService' :: ContainerService -> Maybe [ServiceEvent]
$sel:enableExecuteCommand:ContainerService' :: ContainerService -> Maybe Bool
$sel:enableECSManagedTags:ContainerService' :: ContainerService -> Maybe Bool
$sel:desiredCount:ContainerService' :: ContainerService -> Maybe Int
$sel:deployments:ContainerService' :: ContainerService -> Maybe [Deployment]
$sel:deploymentController:ContainerService' :: ContainerService -> Maybe DeploymentController
$sel:deploymentConfiguration:ContainerService' :: ContainerService -> Maybe DeploymentConfiguration
$sel:createdBy:ContainerService' :: ContainerService -> Maybe Text
$sel:createdAt:ContainerService' :: ContainerService -> Maybe POSIX
$sel:clusterArn:ContainerService' :: ContainerService -> Maybe Text
$sel:capacityProviderStrategy:ContainerService' :: ContainerService -> Maybe [CapacityProviderStrategyItem]
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe [CapacityProviderStrategyItem]
capacityProviderStrategy
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
clusterArn
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe POSIX
createdAt
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
createdBy
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe DeploymentConfiguration
deploymentConfiguration
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe DeploymentController
deploymentController
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [Deployment]
deployments
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Int
desiredCount
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Bool
enableECSManagedTags
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Bool
enableExecuteCommand
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [ServiceEvent]
events
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Int
healthCheckGracePeriodSeconds
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe LaunchType
launchType
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [LoadBalancer]
loadBalancers
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe NetworkConfiguration
networkConfiguration
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Int
pendingCount
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [PlacementConstraint]
placementConstraints
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [PlacementStrategy]
placementStrategy
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
platformFamily
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
platformVersion
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe PropagateTags
propagateTags
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
roleArn
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Int
runningCount
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf
        Maybe SchedulingStrategy
schedulingStrategy
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf
        Maybe Text
serviceArn
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf
        Maybe Text
serviceName
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf
        Maybe [ServiceRegistry]
serviceRegistries
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf
        Maybe Text
status
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf
        Maybe [Tag]
tags
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf
        Maybe Text
taskDefinition
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf
        Maybe [TaskSet]
taskSets