{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE DuplicateRecordFields #-}
{-# LANGUAGE NamedFieldPuns #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE RecordWildCards #-}
{-# LANGUAGE StrictData #-}
{-# LANGUAGE TypeFamilies #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# OPTIONS_GHC -fno-warn-unused-binds #-}
{-# 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.CreateService
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
--
-- Runs and maintains your desired number of tasks from a specified task
-- definition. If the number of tasks running in a service drops below the
-- @desiredCount@, Amazon ECS runs another copy of the task in the
-- specified cluster. To update an existing service, see the UpdateService
-- action.
--
-- In addition to maintaining the desired count of tasks in your service,
-- you can optionally run your service behind one or more load balancers.
-- The load balancers distribute traffic across the tasks that are
-- associated with the service. For more information, see
-- <https://docs.aws.amazon.com/AmazonECS/latest/developerguide/service-load-balancing.html Service load balancing>
-- in the /Amazon Elastic Container Service Developer Guide/.
--
-- Tasks for services that don\'t use a load balancer are considered
-- healthy if they\'re in the @RUNNING@ state. Tasks for services that use
-- a load balancer are considered healthy if they\'re in the @RUNNING@
-- state and are reported as healthy by the load balancer.
--
-- There are two service scheduler strategies available:
--
-- -   @REPLICA@ - The replica scheduling strategy places and maintains
--     your 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. For more information, see
--     <https://docs.aws.amazon.com/AmazonECS/latest/developerguide/ecs_services.html Service scheduler concepts>
--     in the /Amazon Elastic Container Service Developer Guide/.
--
-- -   @DAEMON@ - The daemon scheduling strategy deploys exactly one task
--     on each active container instance that 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 also stops tasks that don\'t meet the placement
--     constraints. When using this strategy, you don\'t need to specify a
--     desired number of tasks, a task placement strategy, or use Service
--     Auto Scaling policies. For more information, see
--     <https://docs.aws.amazon.com/AmazonECS/latest/developerguide/ecs_services.html Service scheduler concepts>
--     in the /Amazon Elastic Container Service Developer Guide/.
--
-- You can optionally specify a deployment configuration for your service.
-- The deployment is initiated by changing properties. For example, the
-- deployment might be initiated by the task definition or by your desired
-- count of a service. This is done with an UpdateService operation. The
-- default value for a replica service for @minimumHealthyPercent@ is 100%.
-- The default value for a daemon service for @minimumHealthyPercent@ is
-- 0%.
--
-- If a service uses the @ECS@ deployment controller, the minimum healthy
-- percent represents a lower limit on the number of tasks in a service
-- that must remain in the @RUNNING@ state during a deployment.
-- Specifically, it represents it as a percentage of your desired number of
-- tasks (rounded up to the nearest integer). This happens when any of your
-- container instances are in the @DRAINING@ state if the service contains
-- tasks using the EC2 launch type. Using this parameter, you can deploy
-- without using additional cluster capacity. For example, if you set your
-- service to have desired number of four tasks and a minimum healthy
-- percent of 50%, the scheduler might stop two existing tasks to free up
-- cluster capacity before starting two new tasks. If they\'re in the
-- @RUNNING@ state, tasks for services that don\'t use a load balancer are
-- considered healthy . If they\'re in the @RUNNING@ state and reported as
-- healthy by the load balancer, tasks for services that /do/ use a load
-- balancer are considered healthy . The default value for minimum healthy
-- percent is 100%.
--
-- If a service uses the @ECS@ deployment controller, the __maximum
-- percent__ parameter represents an upper limit on the number of tasks in
-- a service that are allowed in the @RUNNING@ or @PENDING@ state during a
-- deployment. Specifically, it represents it as a percentage of the
-- desired number of tasks (rounded down to the nearest integer). This
-- happens when any of your container instances are in the @DRAINING@ state
-- if the service contains tasks using the EC2 launch type. Using this
-- parameter, you can define the deployment batch size. For example, if
-- your service has a desired number of four tasks and a maximum percent
-- value of 200%, the scheduler may start four new tasks before stopping
-- the four older tasks (provided that the cluster resources required to do
-- this are available). The default value for maximum percent is 200%.
--
-- If a service uses either the @CODE_DEPLOY@ or @EXTERNAL@ deployment
-- controller types and tasks that use the EC2 launch type, the __minimum
-- healthy percent__ and __maximum percent__ values are used only to define
-- the lower and upper limit on the number of the tasks in the service that
-- remain in the @RUNNING@ state. This is while the container instances are
-- in the @DRAINING@ state. If the tasks in the service use the Fargate
-- launch type, the minimum healthy percent and maximum percent values
-- aren\'t used. This is the case even if they\'re currently visible when
-- describing your service.
--
-- When creating a service that uses the @EXTERNAL@ deployment controller,
-- you can specify only parameters that aren\'t controlled at the task set
-- level. The only required parameter is the service name. You control your
-- services using the CreateTaskSet operation. For more information, see
-- <https://docs.aws.amazon.com/AmazonECS/latest/developerguide/deployment-types.html Amazon ECS deployment types>
-- in the /Amazon Elastic Container Service Developer Guide/.
--
-- When the service scheduler launches new tasks, it determines task
-- placement. For information about task placement and task placement
-- strategies, see
-- <https://docs.aws.amazon.com/AmazonECS/latest/developerguide/task-placement.html Amazon ECS task placement>
-- in the /Amazon Elastic Container Service Developer Guide/.
module Amazonka.ECS.CreateService
  ( -- * Creating a Request
    CreateService (..),
    newCreateService,

    -- * Request Lenses
    createService_capacityProviderStrategy,
    createService_clientToken,
    createService_cluster,
    createService_deploymentConfiguration,
    createService_deploymentController,
    createService_desiredCount,
    createService_enableECSManagedTags,
    createService_enableExecuteCommand,
    createService_healthCheckGracePeriodSeconds,
    createService_launchType,
    createService_loadBalancers,
    createService_networkConfiguration,
    createService_placementConstraints,
    createService_placementStrategy,
    createService_platformVersion,
    createService_propagateTags,
    createService_role,
    createService_schedulingStrategy,
    createService_serviceConnectConfiguration,
    createService_serviceRegistries,
    createService_tags,
    createService_taskDefinition,
    createService_serviceName,

    -- * Destructuring the Response
    CreateServiceResponse (..),
    newCreateServiceResponse,

    -- * Response Lenses
    createServiceResponse_service,
    createServiceResponse_httpStatus,
  )
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
import qualified Amazonka.Prelude as Prelude
import qualified Amazonka.Request as Request
import qualified Amazonka.Response as Response

-- | /See:/ 'newCreateService' smart constructor.
data CreateService = CreateService'
  { -- | The capacity provider strategy to use for the service.
    --
    -- If a @capacityProviderStrategy@ is specified, the @launchType@ parameter
    -- must be omitted. If no @capacityProviderStrategy@ or @launchType@ is
    -- specified, the @defaultCapacityProviderStrategy@ for the cluster is
    -- used.
    --
    -- A capacity provider strategy may contain a maximum of 6 capacity
    -- providers.
    CreateService -> Maybe [CapacityProviderStrategyItem]
capacityProviderStrategy :: Prelude.Maybe [CapacityProviderStrategyItem],
    -- | An identifier that you provide to ensure the idempotency of the request.
    -- It must be unique and is case sensitive. Up to 32 ASCII characters are
    -- allowed.
    CreateService -> Maybe Text
clientToken :: Prelude.Maybe Prelude.Text,
    -- | The short name or full Amazon Resource Name (ARN) of the cluster that
    -- you run your service on. If you do not specify a cluster, the default
    -- cluster is assumed.
    CreateService -> Maybe Text
cluster :: Prelude.Maybe Prelude.Text,
    -- | Optional deployment parameters that control how many tasks run during
    -- the deployment and the ordering of stopping and starting tasks.
    CreateService -> Maybe DeploymentConfiguration
deploymentConfiguration :: Prelude.Maybe DeploymentConfiguration,
    -- | The deployment controller to use for the service. If no deployment
    -- controller is specified, the default value of @ECS@ is used.
    CreateService -> Maybe DeploymentController
deploymentController :: Prelude.Maybe DeploymentController,
    -- | The number of instantiations of the specified task definition to place
    -- and keep running on your cluster.
    --
    -- This is required if @schedulingStrategy@ is @REPLICA@ or isn\'t
    -- specified. If @schedulingStrategy@ is @DAEMON@ then this isn\'t
    -- required.
    CreateService -> Maybe Int
desiredCount :: Prelude.Maybe Prelude.Int,
    -- | Specifies whether to turn on Amazon ECS managed tags for the tasks
    -- within 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/.
    CreateService -> Maybe Bool
enableECSManagedTags :: Prelude.Maybe Prelude.Bool,
    -- | Determines whether the execute command functionality is enabled for the
    -- service. If @true@, this enables execute command functionality on all
    -- containers in the service tasks.
    CreateService -> Maybe Bool
enableExecuteCommand :: Prelude.Maybe Prelude.Bool,
    -- | 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. This is only used when your service is
    -- configured to use a load balancer. If your service has a load balancer
    -- defined and you don\'t specify a health check grace period value, the
    -- default value of @0@ is used.
    --
    -- If you do not use an Elastic Load Balancing, we recommend that you use
    -- the @startPeriod@ in the task definition health check parameters. For
    -- more information, see
    -- <https://docs.aws.amazon.com/AmazonECS/latest/APIReference/API_HealthCheck.html Health check>.
    --
    -- If your service\'s tasks take a while to start and respond to Elastic
    -- Load Balancing health checks, you can specify a health check grace
    -- period of up to 2,147,483,647 seconds (about 69 years). During that
    -- time, the Amazon ECS service scheduler ignores health check status. This
    -- grace period can prevent the service scheduler from marking tasks as
    -- unhealthy and stopping them before they have time to come up.
    CreateService -> Maybe Int
healthCheckGracePeriodSeconds :: Prelude.Maybe Prelude.Int,
    -- | The infrastructure that you run your service on. For more information,
    -- see
    -- <https://docs.aws.amazon.com/AmazonECS/latest/developerguide/launch_types.html Amazon ECS launch types>
    -- in the /Amazon Elastic Container Service Developer Guide/.
    --
    -- The @FARGATE@ launch type runs your tasks on Fargate On-Demand
    -- infrastructure.
    --
    -- Fargate Spot infrastructure is available for use but a capacity provider
    -- strategy must be used. For more information, see
    -- <https://docs.aws.amazon.com/AmazonECS/latest/userguide/fargate-capacity-providers.html Fargate capacity providers>
    -- in the /Amazon ECS User Guide for Fargate/.
    --
    -- The @EC2@ launch type runs your tasks on Amazon EC2 instances registered
    -- to your cluster.
    --
    -- The @EXTERNAL@ launch type runs your tasks on your on-premises server or
    -- virtual machine (VM) capacity registered to your cluster.
    --
    -- A service can use either a launch type or a capacity provider strategy.
    -- If a @launchType@ is specified, the @capacityProviderStrategy@ parameter
    -- must be omitted.
    CreateService -> Maybe LaunchType
launchType :: Prelude.Maybe LaunchType,
    -- | A load balancer object representing the load balancers to use with your
    -- service. For more information, see
    -- <https://docs.aws.amazon.com/AmazonECS/latest/developerguide/service-load-balancing.html Service load balancing>
    -- in the /Amazon Elastic Container Service Developer Guide/.
    --
    -- If the service uses the rolling update (@ECS@) deployment controller and
    -- using either an Application Load Balancer or Network Load Balancer, you
    -- must specify one or more target group ARNs to attach to the service. The
    -- service-linked role is required for services that use multiple target
    -- groups. For more information, see
    -- <https://docs.aws.amazon.com/AmazonECS/latest/developerguide/using-service-linked-roles.html Using service-linked roles for Amazon ECS>
    -- in the /Amazon Elastic Container Service Developer Guide/.
    --
    -- If the service uses the @CODE_DEPLOY@ deployment controller, the service
    -- is required to use either an Application Load Balancer or Network Load
    -- Balancer. When creating an CodeDeploy deployment group, you specify two
    -- target groups (referred to as a @targetGroupPair@). During a deployment,
    -- CodeDeploy determines which task set in your service has the status
    -- @PRIMARY@, and it associates one target group with it. Then, it also
    -- associates the other target group with the replacement task set. The
    -- load balancer can also have up to two listeners: a required listener for
    -- production traffic and an optional listener that you can use to perform
    -- validation tests with Lambda functions before routing production traffic
    -- to it.
    --
    -- If you use the @CODE_DEPLOY@ deployment controller, these values can be
    -- changed when updating the service.
    --
    -- For Application Load Balancers and Network Load Balancers, this object
    -- must contain the load balancer target group ARN, the container name, and
    -- the container port to access from the load balancer. The container name
    -- must be as it appears in a container definition. The load balancer name
    -- parameter must be omitted. When a task from this service is placed on a
    -- container instance, the container instance and port combination is
    -- registered as a target in the target group that\'s specified here.
    --
    -- For Classic Load Balancers, this object must contain the load balancer
    -- name, the container name , and the container port to access from the
    -- load balancer. The container name must be as it appears in a container
    -- definition. The target group ARN parameter must be omitted. When a task
    -- from this service is placed on a container instance, the container
    -- instance is registered with the load balancer that\'s specified here.
    --
    -- Services with tasks that use the @awsvpc@ network mode (for example,
    -- those with the Fargate launch type) only support Application Load
    -- Balancers and Network Load Balancers. Classic Load Balancers aren\'t
    -- supported. Also, when you create any target groups for these services,
    -- you must choose @ip@ as the target type, not @instance@. This is because
    -- tasks that use the @awsvpc@ network mode are associated with an elastic
    -- network interface, not an Amazon EC2 instance.
    CreateService -> Maybe [LoadBalancer]
loadBalancers :: Prelude.Maybe [LoadBalancer],
    -- | The network configuration for the service. This parameter is required
    -- for task definitions that use the @awsvpc@ network mode to receive their
    -- own elastic network interface, and it isn\'t supported for other network
    -- modes. For more information, see
    -- <https://docs.aws.amazon.com/AmazonECS/latest/developerguide/task-networking.html Task networking>
    -- in the /Amazon Elastic Container Service Developer Guide/.
    CreateService -> Maybe NetworkConfiguration
networkConfiguration :: Prelude.Maybe NetworkConfiguration,
    -- | An array of placement constraint objects to use for tasks in your
    -- service. You can specify a maximum of 10 constraints for each task. This
    -- limit includes constraints in the task definition and those specified at
    -- runtime.
    CreateService -> Maybe [PlacementConstraint]
placementConstraints :: Prelude.Maybe [PlacementConstraint],
    -- | The placement strategy objects to use for tasks in your service. You can
    -- specify a maximum of 5 strategy rules for each service.
    CreateService -> Maybe [PlacementStrategy]
placementStrategy :: Prelude.Maybe [PlacementStrategy],
    -- | The platform version that your tasks in the service are running on. A
    -- platform version is specified only for tasks using the Fargate launch
    -- type. 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/.
    CreateService -> Maybe Text
platformVersion :: Prelude.Maybe Prelude.Text,
    -- | Specifies whether to propagate the tags from the task definition to the
    -- task. If no value is specified, the tags aren\'t propagated. Tags can
    -- only be propagated to the task during task creation. To add tags to a
    -- task after task creation, use the TagResource API action.
    CreateService -> Maybe PropagateTags
propagateTags :: Prelude.Maybe PropagateTags,
    -- | The name or full Amazon Resource Name (ARN) of the IAM role that allows
    -- Amazon ECS to make calls to your load balancer on your behalf. This
    -- parameter is only permitted if you are using a load balancer with your
    -- service and your task definition doesn\'t use the @awsvpc@ network mode.
    -- If you specify the @role@ parameter, you must also specify a load
    -- balancer object with the @loadBalancers@ parameter.
    --
    -- If your account has already created the Amazon ECS service-linked role,
    -- that role is used for your service unless you specify a role here. The
    -- service-linked role is required if your task definition uses the
    -- @awsvpc@ network mode or if the service is configured to use service
    -- discovery, an external deployment controller, multiple target groups, or
    -- Elastic Inference accelerators in which case you don\'t specify a role
    -- here. For more information, see
    -- <https://docs.aws.amazon.com/AmazonECS/latest/developerguide/using-service-linked-roles.html Using service-linked roles for Amazon ECS>
    -- in the /Amazon Elastic Container Service Developer Guide/.
    --
    -- If your specified role has a path other than @\/@, then you must either
    -- specify the full role ARN (this is recommended) or prefix the role name
    -- with the path. For example, if a role with the name @bar@ has a path of
    -- @\/foo\/@ then you would specify @\/foo\/bar@ as the role name. For more
    -- information, see
    -- <https://docs.aws.amazon.com/IAM/latest/UserGuide/reference_identifiers.html#identifiers-friendly-names Friendly names and paths>
    -- in the /IAM User Guide/.
    CreateService -> Maybe Text
role' :: Prelude.Maybe Prelude.Text,
    -- | 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. This scheduler strategy is required if the service uses
    --     the @CODE_DEPLOY@ or @EXTERNAL@ deployment controller types.
    --
    -- -   @DAEMON@-The daemon scheduling strategy deploys exactly one task on
    --     each active container instance that 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 and
    --     will stop tasks that don\'t meet the placement constraints. When
    --     you\'re using this strategy, you don\'t need to specify a desired
    --     number of tasks, a task placement strategy, or use Service Auto
    --     Scaling policies.
    --
    --     Tasks using the Fargate launch type or the @CODE_DEPLOY@ or
    --     @EXTERNAL@ deployment controller types don\'t support the @DAEMON@
    --     scheduling strategy.
    CreateService -> Maybe SchedulingStrategy
schedulingStrategy :: Prelude.Maybe SchedulingStrategy,
    -- | The configuration for this service to discover and connect to services,
    -- and be discovered by, and connected from, other services within a
    -- namespace.
    --
    -- Tasks that run in a namespace can use short names to connect to services
    -- in the namespace. Tasks can connect to services across all of the
    -- clusters in the namespace. Tasks connect through a managed proxy
    -- container that collects logs and metrics for increased visibility. Only
    -- the tasks that Amazon ECS services create are supported with Service
    -- Connect. For more information, see
    -- <https://docs.aws.amazon.com/AmazonECS/latest/developerguide/service-connect.html Service Connect>
    -- in the /Amazon Elastic Container Service Developer Guide/.
    CreateService -> Maybe ServiceConnectConfiguration
serviceConnectConfiguration :: Prelude.Maybe ServiceConnectConfiguration,
    -- | The details of the service discovery registry to associate with this
    -- service. For more information, see
    -- <https://docs.aws.amazon.com/AmazonECS/latest/developerguide/service-discovery.html Service discovery>.
    --
    -- Each service may be associated with one service registry. Multiple
    -- service registries for each service isn\'t supported.
    CreateService -> Maybe [ServiceRegistry]
serviceRegistries :: Prelude.Maybe [ServiceRegistry],
    -- | 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, both of
    -- which you define. When a service is deleted, the tags are deleted as
    -- well.
    --
    -- 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.
    CreateService -> Maybe [Tag]
tags :: Prelude.Maybe [Tag],
    -- | The @family@ and @revision@ (@family:revision@) or full ARN of the task
    -- definition to run in your service. If a @revision@ isn\'t specified, the
    -- latest @ACTIVE@ revision is used.
    --
    -- A task definition must be specified if the service uses either the @ECS@
    -- or @CODE_DEPLOY@ deployment controllers.
    CreateService -> Maybe Text
taskDefinition :: 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, but you can have similarly named services in
    -- multiple clusters within a Region or across multiple Regions.
    CreateService -> Text
serviceName :: Prelude.Text
  }
  deriving (CreateService -> CreateService -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: CreateService -> CreateService -> Bool
$c/= :: CreateService -> CreateService -> Bool
== :: CreateService -> CreateService -> Bool
$c== :: CreateService -> CreateService -> Bool
Prelude.Eq, ReadPrec [CreateService]
ReadPrec CreateService
Int -> ReadS CreateService
ReadS [CreateService]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [CreateService]
$creadListPrec :: ReadPrec [CreateService]
readPrec :: ReadPrec CreateService
$creadPrec :: ReadPrec CreateService
readList :: ReadS [CreateService]
$creadList :: ReadS [CreateService]
readsPrec :: Int -> ReadS CreateService
$creadsPrec :: Int -> ReadS CreateService
Prelude.Read, Int -> CreateService -> ShowS
[CreateService] -> ShowS
CreateService -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [CreateService] -> ShowS
$cshowList :: [CreateService] -> ShowS
show :: CreateService -> String
$cshow :: CreateService -> String
showsPrec :: Int -> CreateService -> ShowS
$cshowsPrec :: Int -> CreateService -> ShowS
Prelude.Show, forall x. Rep CreateService x -> CreateService
forall x. CreateService -> Rep CreateService x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep CreateService x -> CreateService
$cfrom :: forall x. CreateService -> Rep CreateService x
Prelude.Generic)

-- |
-- Create a value of 'CreateService' 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', 'createService_capacityProviderStrategy' - The capacity provider strategy to use for the service.
--
-- If a @capacityProviderStrategy@ is specified, the @launchType@ parameter
-- must be omitted. If no @capacityProviderStrategy@ or @launchType@ is
-- specified, the @defaultCapacityProviderStrategy@ for the cluster is
-- used.
--
-- A capacity provider strategy may contain a maximum of 6 capacity
-- providers.
--
-- 'clientToken', 'createService_clientToken' - An identifier that you provide to ensure the idempotency of the request.
-- It must be unique and is case sensitive. Up to 32 ASCII characters are
-- allowed.
--
-- 'cluster', 'createService_cluster' - The short name or full Amazon Resource Name (ARN) of the cluster that
-- you run your service on. If you do not specify a cluster, the default
-- cluster is assumed.
--
-- 'deploymentConfiguration', 'createService_deploymentConfiguration' - Optional deployment parameters that control how many tasks run during
-- the deployment and the ordering of stopping and starting tasks.
--
-- 'deploymentController', 'createService_deploymentController' - The deployment controller to use for the service. If no deployment
-- controller is specified, the default value of @ECS@ is used.
--
-- 'desiredCount', 'createService_desiredCount' - The number of instantiations of the specified task definition to place
-- and keep running on your cluster.
--
-- This is required if @schedulingStrategy@ is @REPLICA@ or isn\'t
-- specified. If @schedulingStrategy@ is @DAEMON@ then this isn\'t
-- required.
--
-- 'enableECSManagedTags', 'createService_enableECSManagedTags' - Specifies whether to turn on Amazon ECS managed tags for the tasks
-- within 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', 'createService_enableExecuteCommand' - Determines whether the execute command functionality is enabled for the
-- service. If @true@, this enables execute command functionality on all
-- containers in the service tasks.
--
-- 'healthCheckGracePeriodSeconds', 'createService_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. This is only used when your service is
-- configured to use a load balancer. If your service has a load balancer
-- defined and you don\'t specify a health check grace period value, the
-- default value of @0@ is used.
--
-- If you do not use an Elastic Load Balancing, we recommend that you use
-- the @startPeriod@ in the task definition health check parameters. For
-- more information, see
-- <https://docs.aws.amazon.com/AmazonECS/latest/APIReference/API_HealthCheck.html Health check>.
--
-- If your service\'s tasks take a while to start and respond to Elastic
-- Load Balancing health checks, you can specify a health check grace
-- period of up to 2,147,483,647 seconds (about 69 years). During that
-- time, the Amazon ECS service scheduler ignores health check status. This
-- grace period can prevent the service scheduler from marking tasks as
-- unhealthy and stopping them before they have time to come up.
--
-- 'launchType', 'createService_launchType' - The infrastructure that you run your service on. For more information,
-- see
-- <https://docs.aws.amazon.com/AmazonECS/latest/developerguide/launch_types.html Amazon ECS launch types>
-- in the /Amazon Elastic Container Service Developer Guide/.
--
-- The @FARGATE@ launch type runs your tasks on Fargate On-Demand
-- infrastructure.
--
-- Fargate Spot infrastructure is available for use but a capacity provider
-- strategy must be used. For more information, see
-- <https://docs.aws.amazon.com/AmazonECS/latest/userguide/fargate-capacity-providers.html Fargate capacity providers>
-- in the /Amazon ECS User Guide for Fargate/.
--
-- The @EC2@ launch type runs your tasks on Amazon EC2 instances registered
-- to your cluster.
--
-- The @EXTERNAL@ launch type runs your tasks on your on-premises server or
-- virtual machine (VM) capacity registered to your cluster.
--
-- A service can use either a launch type or a capacity provider strategy.
-- If a @launchType@ is specified, the @capacityProviderStrategy@ parameter
-- must be omitted.
--
-- 'loadBalancers', 'createService_loadBalancers' - A load balancer object representing the load balancers to use with your
-- service. For more information, see
-- <https://docs.aws.amazon.com/AmazonECS/latest/developerguide/service-load-balancing.html Service load balancing>
-- in the /Amazon Elastic Container Service Developer Guide/.
--
-- If the service uses the rolling update (@ECS@) deployment controller and
-- using either an Application Load Balancer or Network Load Balancer, you
-- must specify one or more target group ARNs to attach to the service. The
-- service-linked role is required for services that use multiple target
-- groups. For more information, see
-- <https://docs.aws.amazon.com/AmazonECS/latest/developerguide/using-service-linked-roles.html Using service-linked roles for Amazon ECS>
-- in the /Amazon Elastic Container Service Developer Guide/.
--
-- If the service uses the @CODE_DEPLOY@ deployment controller, the service
-- is required to use either an Application Load Balancer or Network Load
-- Balancer. When creating an CodeDeploy deployment group, you specify two
-- target groups (referred to as a @targetGroupPair@). During a deployment,
-- CodeDeploy determines which task set in your service has the status
-- @PRIMARY@, and it associates one target group with it. Then, it also
-- associates the other target group with the replacement task set. The
-- load balancer can also have up to two listeners: a required listener for
-- production traffic and an optional listener that you can use to perform
-- validation tests with Lambda functions before routing production traffic
-- to it.
--
-- If you use the @CODE_DEPLOY@ deployment controller, these values can be
-- changed when updating the service.
--
-- For Application Load Balancers and Network Load Balancers, this object
-- must contain the load balancer target group ARN, the container name, and
-- the container port to access from the load balancer. The container name
-- must be as it appears in a container definition. The load balancer name
-- parameter must be omitted. When a task from this service is placed on a
-- container instance, the container instance and port combination is
-- registered as a target in the target group that\'s specified here.
--
-- For Classic Load Balancers, this object must contain the load balancer
-- name, the container name , and the container port to access from the
-- load balancer. The container name must be as it appears in a container
-- definition. The target group ARN parameter must be omitted. When a task
-- from this service is placed on a container instance, the container
-- instance is registered with the load balancer that\'s specified here.
--
-- Services with tasks that use the @awsvpc@ network mode (for example,
-- those with the Fargate launch type) only support Application Load
-- Balancers and Network Load Balancers. Classic Load Balancers aren\'t
-- supported. Also, when you create any target groups for these services,
-- you must choose @ip@ as the target type, not @instance@. This is because
-- tasks that use the @awsvpc@ network mode are associated with an elastic
-- network interface, not an Amazon EC2 instance.
--
-- 'networkConfiguration', 'createService_networkConfiguration' - The network configuration for the service. This parameter is required
-- for task definitions that use the @awsvpc@ network mode to receive their
-- own elastic network interface, and it isn\'t supported for other network
-- modes. For more information, see
-- <https://docs.aws.amazon.com/AmazonECS/latest/developerguide/task-networking.html Task networking>
-- in the /Amazon Elastic Container Service Developer Guide/.
--
-- 'placementConstraints', 'createService_placementConstraints' - An array of placement constraint objects to use for tasks in your
-- service. You can specify a maximum of 10 constraints for each task. This
-- limit includes constraints in the task definition and those specified at
-- runtime.
--
-- 'placementStrategy', 'createService_placementStrategy' - The placement strategy objects to use for tasks in your service. You can
-- specify a maximum of 5 strategy rules for each service.
--
-- 'platformVersion', 'createService_platformVersion' - The platform version that your tasks in the service are running on. A
-- platform version is specified only for tasks using the Fargate launch
-- type. 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', 'createService_propagateTags' - Specifies whether to propagate the tags from the task definition to the
-- task. If no value is specified, the tags aren\'t propagated. Tags can
-- only be propagated to the task during task creation. To add tags to a
-- task after task creation, use the TagResource API action.
--
-- 'role'', 'createService_role' - The name or full Amazon Resource Name (ARN) of the IAM role that allows
-- Amazon ECS to make calls to your load balancer on your behalf. This
-- parameter is only permitted if you are using a load balancer with your
-- service and your task definition doesn\'t use the @awsvpc@ network mode.
-- If you specify the @role@ parameter, you must also specify a load
-- balancer object with the @loadBalancers@ parameter.
--
-- If your account has already created the Amazon ECS service-linked role,
-- that role is used for your service unless you specify a role here. The
-- service-linked role is required if your task definition uses the
-- @awsvpc@ network mode or if the service is configured to use service
-- discovery, an external deployment controller, multiple target groups, or
-- Elastic Inference accelerators in which case you don\'t specify a role
-- here. For more information, see
-- <https://docs.aws.amazon.com/AmazonECS/latest/developerguide/using-service-linked-roles.html Using service-linked roles for Amazon ECS>
-- in the /Amazon Elastic Container Service Developer Guide/.
--
-- If your specified role has a path other than @\/@, then you must either
-- specify the full role ARN (this is recommended) or prefix the role name
-- with the path. For example, if a role with the name @bar@ has a path of
-- @\/foo\/@ then you would specify @\/foo\/bar@ as the role name. For more
-- information, see
-- <https://docs.aws.amazon.com/IAM/latest/UserGuide/reference_identifiers.html#identifiers-friendly-names Friendly names and paths>
-- in the /IAM User Guide/.
--
-- 'schedulingStrategy', 'createService_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. This scheduler strategy is required if the service uses
--     the @CODE_DEPLOY@ or @EXTERNAL@ deployment controller types.
--
-- -   @DAEMON@-The daemon scheduling strategy deploys exactly one task on
--     each active container instance that 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 and
--     will stop tasks that don\'t meet the placement constraints. When
--     you\'re using this strategy, you don\'t need to specify a desired
--     number of tasks, a task placement strategy, or use Service Auto
--     Scaling policies.
--
--     Tasks using the Fargate launch type or the @CODE_DEPLOY@ or
--     @EXTERNAL@ deployment controller types don\'t support the @DAEMON@
--     scheduling strategy.
--
-- 'serviceConnectConfiguration', 'createService_serviceConnectConfiguration' - The configuration for this service to discover and connect to services,
-- and be discovered by, and connected from, other services within a
-- namespace.
--
-- Tasks that run in a namespace can use short names to connect to services
-- in the namespace. Tasks can connect to services across all of the
-- clusters in the namespace. Tasks connect through a managed proxy
-- container that collects logs and metrics for increased visibility. Only
-- the tasks that Amazon ECS services create are supported with Service
-- Connect. For more information, see
-- <https://docs.aws.amazon.com/AmazonECS/latest/developerguide/service-connect.html Service Connect>
-- in the /Amazon Elastic Container Service Developer Guide/.
--
-- 'serviceRegistries', 'createService_serviceRegistries' - The details of the service discovery registry to associate with this
-- service. For more information, see
-- <https://docs.aws.amazon.com/AmazonECS/latest/developerguide/service-discovery.html Service discovery>.
--
-- Each service may be associated with one service registry. Multiple
-- service registries for each service isn\'t supported.
--
-- 'tags', 'createService_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, both of
-- which you define. When a service is deleted, the tags are deleted as
-- well.
--
-- 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', 'createService_taskDefinition' - The @family@ and @revision@ (@family:revision@) or full ARN of the task
-- definition to run in your service. If a @revision@ isn\'t specified, the
-- latest @ACTIVE@ revision is used.
--
-- A task definition must be specified if the service uses either the @ECS@
-- or @CODE_DEPLOY@ deployment controllers.
--
-- 'serviceName', 'createService_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, but you can have similarly named services in
-- multiple clusters within a Region or across multiple Regions.
newCreateService ::
  -- | 'serviceName'
  Prelude.Text ->
  CreateService
newCreateService :: Text -> CreateService
newCreateService Text
pServiceName_ =
  CreateService'
    { $sel:capacityProviderStrategy:CreateService' :: Maybe [CapacityProviderStrategyItem]
capacityProviderStrategy =
        forall a. Maybe a
Prelude.Nothing,
      $sel:clientToken:CreateService' :: Maybe Text
clientToken = forall a. Maybe a
Prelude.Nothing,
      $sel:cluster:CreateService' :: Maybe Text
cluster = forall a. Maybe a
Prelude.Nothing,
      $sel:deploymentConfiguration:CreateService' :: Maybe DeploymentConfiguration
deploymentConfiguration = forall a. Maybe a
Prelude.Nothing,
      $sel:deploymentController:CreateService' :: Maybe DeploymentController
deploymentController = forall a. Maybe a
Prelude.Nothing,
      $sel:desiredCount:CreateService' :: Maybe Int
desiredCount = forall a. Maybe a
Prelude.Nothing,
      $sel:enableECSManagedTags:CreateService' :: Maybe Bool
enableECSManagedTags = forall a. Maybe a
Prelude.Nothing,
      $sel:enableExecuteCommand:CreateService' :: Maybe Bool
enableExecuteCommand = forall a. Maybe a
Prelude.Nothing,
      $sel:healthCheckGracePeriodSeconds:CreateService' :: Maybe Int
healthCheckGracePeriodSeconds = forall a. Maybe a
Prelude.Nothing,
      $sel:launchType:CreateService' :: Maybe LaunchType
launchType = forall a. Maybe a
Prelude.Nothing,
      $sel:loadBalancers:CreateService' :: Maybe [LoadBalancer]
loadBalancers = forall a. Maybe a
Prelude.Nothing,
      $sel:networkConfiguration:CreateService' :: Maybe NetworkConfiguration
networkConfiguration = forall a. Maybe a
Prelude.Nothing,
      $sel:placementConstraints:CreateService' :: Maybe [PlacementConstraint]
placementConstraints = forall a. Maybe a
Prelude.Nothing,
      $sel:placementStrategy:CreateService' :: Maybe [PlacementStrategy]
placementStrategy = forall a. Maybe a
Prelude.Nothing,
      $sel:platformVersion:CreateService' :: Maybe Text
platformVersion = forall a. Maybe a
Prelude.Nothing,
      $sel:propagateTags:CreateService' :: Maybe PropagateTags
propagateTags = forall a. Maybe a
Prelude.Nothing,
      $sel:role':CreateService' :: Maybe Text
role' = forall a. Maybe a
Prelude.Nothing,
      $sel:schedulingStrategy:CreateService' :: Maybe SchedulingStrategy
schedulingStrategy = forall a. Maybe a
Prelude.Nothing,
      $sel:serviceConnectConfiguration:CreateService' :: Maybe ServiceConnectConfiguration
serviceConnectConfiguration = forall a. Maybe a
Prelude.Nothing,
      $sel:serviceRegistries:CreateService' :: Maybe [ServiceRegistry]
serviceRegistries = forall a. Maybe a
Prelude.Nothing,
      $sel:tags:CreateService' :: Maybe [Tag]
tags = forall a. Maybe a
Prelude.Nothing,
      $sel:taskDefinition:CreateService' :: Maybe Text
taskDefinition = forall a. Maybe a
Prelude.Nothing,
      $sel:serviceName:CreateService' :: Text
serviceName = Text
pServiceName_
    }

-- | The capacity provider strategy to use for the service.
--
-- If a @capacityProviderStrategy@ is specified, the @launchType@ parameter
-- must be omitted. If no @capacityProviderStrategy@ or @launchType@ is
-- specified, the @defaultCapacityProviderStrategy@ for the cluster is
-- used.
--
-- A capacity provider strategy may contain a maximum of 6 capacity
-- providers.
createService_capacityProviderStrategy :: Lens.Lens' CreateService (Prelude.Maybe [CapacityProviderStrategyItem])
createService_capacityProviderStrategy :: Lens' CreateService (Maybe [CapacityProviderStrategyItem])
createService_capacityProviderStrategy = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateService' {Maybe [CapacityProviderStrategyItem]
capacityProviderStrategy :: Maybe [CapacityProviderStrategyItem]
$sel:capacityProviderStrategy:CreateService' :: CreateService -> Maybe [CapacityProviderStrategyItem]
capacityProviderStrategy} -> Maybe [CapacityProviderStrategyItem]
capacityProviderStrategy) (\s :: CreateService
s@CreateService' {} Maybe [CapacityProviderStrategyItem]
a -> CreateService
s {$sel:capacityProviderStrategy:CreateService' :: Maybe [CapacityProviderStrategyItem]
capacityProviderStrategy = Maybe [CapacityProviderStrategyItem]
a} :: CreateService) 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

-- | An identifier that you provide to ensure the idempotency of the request.
-- It must be unique and is case sensitive. Up to 32 ASCII characters are
-- allowed.
createService_clientToken :: Lens.Lens' CreateService (Prelude.Maybe Prelude.Text)
createService_clientToken :: Lens' CreateService (Maybe Text)
createService_clientToken = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateService' {Maybe Text
clientToken :: Maybe Text
$sel:clientToken:CreateService' :: CreateService -> Maybe Text
clientToken} -> Maybe Text
clientToken) (\s :: CreateService
s@CreateService' {} Maybe Text
a -> CreateService
s {$sel:clientToken:CreateService' :: Maybe Text
clientToken = Maybe Text
a} :: CreateService)

-- | The short name or full Amazon Resource Name (ARN) of the cluster that
-- you run your service on. If you do not specify a cluster, the default
-- cluster is assumed.
createService_cluster :: Lens.Lens' CreateService (Prelude.Maybe Prelude.Text)
createService_cluster :: Lens' CreateService (Maybe Text)
createService_cluster = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateService' {Maybe Text
cluster :: Maybe Text
$sel:cluster:CreateService' :: CreateService -> Maybe Text
cluster} -> Maybe Text
cluster) (\s :: CreateService
s@CreateService' {} Maybe Text
a -> CreateService
s {$sel:cluster:CreateService' :: Maybe Text
cluster = Maybe Text
a} :: CreateService)

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

-- | The deployment controller to use for the service. If no deployment
-- controller is specified, the default value of @ECS@ is used.
createService_deploymentController :: Lens.Lens' CreateService (Prelude.Maybe DeploymentController)
createService_deploymentController :: Lens' CreateService (Maybe DeploymentController)
createService_deploymentController = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateService' {Maybe DeploymentController
deploymentController :: Maybe DeploymentController
$sel:deploymentController:CreateService' :: CreateService -> Maybe DeploymentController
deploymentController} -> Maybe DeploymentController
deploymentController) (\s :: CreateService
s@CreateService' {} Maybe DeploymentController
a -> CreateService
s {$sel:deploymentController:CreateService' :: Maybe DeploymentController
deploymentController = Maybe DeploymentController
a} :: CreateService)

-- | The number of instantiations of the specified task definition to place
-- and keep running on your cluster.
--
-- This is required if @schedulingStrategy@ is @REPLICA@ or isn\'t
-- specified. If @schedulingStrategy@ is @DAEMON@ then this isn\'t
-- required.
createService_desiredCount :: Lens.Lens' CreateService (Prelude.Maybe Prelude.Int)
createService_desiredCount :: Lens' CreateService (Maybe Int)
createService_desiredCount = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateService' {Maybe Int
desiredCount :: Maybe Int
$sel:desiredCount:CreateService' :: CreateService -> Maybe Int
desiredCount} -> Maybe Int
desiredCount) (\s :: CreateService
s@CreateService' {} Maybe Int
a -> CreateService
s {$sel:desiredCount:CreateService' :: Maybe Int
desiredCount = Maybe Int
a} :: CreateService)

-- | Specifies whether to turn on Amazon ECS managed tags for the tasks
-- within 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/.
createService_enableECSManagedTags :: Lens.Lens' CreateService (Prelude.Maybe Prelude.Bool)
createService_enableECSManagedTags :: Lens' CreateService (Maybe Bool)
createService_enableECSManagedTags = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateService' {Maybe Bool
enableECSManagedTags :: Maybe Bool
$sel:enableECSManagedTags:CreateService' :: CreateService -> Maybe Bool
enableECSManagedTags} -> Maybe Bool
enableECSManagedTags) (\s :: CreateService
s@CreateService' {} Maybe Bool
a -> CreateService
s {$sel:enableECSManagedTags:CreateService' :: Maybe Bool
enableECSManagedTags = Maybe Bool
a} :: CreateService)

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

-- | 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. This is only used when your service is
-- configured to use a load balancer. If your service has a load balancer
-- defined and you don\'t specify a health check grace period value, the
-- default value of @0@ is used.
--
-- If you do not use an Elastic Load Balancing, we recommend that you use
-- the @startPeriod@ in the task definition health check parameters. For
-- more information, see
-- <https://docs.aws.amazon.com/AmazonECS/latest/APIReference/API_HealthCheck.html Health check>.
--
-- If your service\'s tasks take a while to start and respond to Elastic
-- Load Balancing health checks, you can specify a health check grace
-- period of up to 2,147,483,647 seconds (about 69 years). During that
-- time, the Amazon ECS service scheduler ignores health check status. This
-- grace period can prevent the service scheduler from marking tasks as
-- unhealthy and stopping them before they have time to come up.
createService_healthCheckGracePeriodSeconds :: Lens.Lens' CreateService (Prelude.Maybe Prelude.Int)
createService_healthCheckGracePeriodSeconds :: Lens' CreateService (Maybe Int)
createService_healthCheckGracePeriodSeconds = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateService' {Maybe Int
healthCheckGracePeriodSeconds :: Maybe Int
$sel:healthCheckGracePeriodSeconds:CreateService' :: CreateService -> Maybe Int
healthCheckGracePeriodSeconds} -> Maybe Int
healthCheckGracePeriodSeconds) (\s :: CreateService
s@CreateService' {} Maybe Int
a -> CreateService
s {$sel:healthCheckGracePeriodSeconds:CreateService' :: Maybe Int
healthCheckGracePeriodSeconds = Maybe Int
a} :: CreateService)

-- | The infrastructure that you run your service on. For more information,
-- see
-- <https://docs.aws.amazon.com/AmazonECS/latest/developerguide/launch_types.html Amazon ECS launch types>
-- in the /Amazon Elastic Container Service Developer Guide/.
--
-- The @FARGATE@ launch type runs your tasks on Fargate On-Demand
-- infrastructure.
--
-- Fargate Spot infrastructure is available for use but a capacity provider
-- strategy must be used. For more information, see
-- <https://docs.aws.amazon.com/AmazonECS/latest/userguide/fargate-capacity-providers.html Fargate capacity providers>
-- in the /Amazon ECS User Guide for Fargate/.
--
-- The @EC2@ launch type runs your tasks on Amazon EC2 instances registered
-- to your cluster.
--
-- The @EXTERNAL@ launch type runs your tasks on your on-premises server or
-- virtual machine (VM) capacity registered to your cluster.
--
-- A service can use either a launch type or a capacity provider strategy.
-- If a @launchType@ is specified, the @capacityProviderStrategy@ parameter
-- must be omitted.
createService_launchType :: Lens.Lens' CreateService (Prelude.Maybe LaunchType)
createService_launchType :: Lens' CreateService (Maybe LaunchType)
createService_launchType = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateService' {Maybe LaunchType
launchType :: Maybe LaunchType
$sel:launchType:CreateService' :: CreateService -> Maybe LaunchType
launchType} -> Maybe LaunchType
launchType) (\s :: CreateService
s@CreateService' {} Maybe LaunchType
a -> CreateService
s {$sel:launchType:CreateService' :: Maybe LaunchType
launchType = Maybe LaunchType
a} :: CreateService)

-- | A load balancer object representing the load balancers to use with your
-- service. For more information, see
-- <https://docs.aws.amazon.com/AmazonECS/latest/developerguide/service-load-balancing.html Service load balancing>
-- in the /Amazon Elastic Container Service Developer Guide/.
--
-- If the service uses the rolling update (@ECS@) deployment controller and
-- using either an Application Load Balancer or Network Load Balancer, you
-- must specify one or more target group ARNs to attach to the service. The
-- service-linked role is required for services that use multiple target
-- groups. For more information, see
-- <https://docs.aws.amazon.com/AmazonECS/latest/developerguide/using-service-linked-roles.html Using service-linked roles for Amazon ECS>
-- in the /Amazon Elastic Container Service Developer Guide/.
--
-- If the service uses the @CODE_DEPLOY@ deployment controller, the service
-- is required to use either an Application Load Balancer or Network Load
-- Balancer. When creating an CodeDeploy deployment group, you specify two
-- target groups (referred to as a @targetGroupPair@). During a deployment,
-- CodeDeploy determines which task set in your service has the status
-- @PRIMARY@, and it associates one target group with it. Then, it also
-- associates the other target group with the replacement task set. The
-- load balancer can also have up to two listeners: a required listener for
-- production traffic and an optional listener that you can use to perform
-- validation tests with Lambda functions before routing production traffic
-- to it.
--
-- If you use the @CODE_DEPLOY@ deployment controller, these values can be
-- changed when updating the service.
--
-- For Application Load Balancers and Network Load Balancers, this object
-- must contain the load balancer target group ARN, the container name, and
-- the container port to access from the load balancer. The container name
-- must be as it appears in a container definition. The load balancer name
-- parameter must be omitted. When a task from this service is placed on a
-- container instance, the container instance and port combination is
-- registered as a target in the target group that\'s specified here.
--
-- For Classic Load Balancers, this object must contain the load balancer
-- name, the container name , and the container port to access from the
-- load balancer. The container name must be as it appears in a container
-- definition. The target group ARN parameter must be omitted. When a task
-- from this service is placed on a container instance, the container
-- instance is registered with the load balancer that\'s specified here.
--
-- Services with tasks that use the @awsvpc@ network mode (for example,
-- those with the Fargate launch type) only support Application Load
-- Balancers and Network Load Balancers. Classic Load Balancers aren\'t
-- supported. Also, when you create any target groups for these services,
-- you must choose @ip@ as the target type, not @instance@. This is because
-- tasks that use the @awsvpc@ network mode are associated with an elastic
-- network interface, not an Amazon EC2 instance.
createService_loadBalancers :: Lens.Lens' CreateService (Prelude.Maybe [LoadBalancer])
createService_loadBalancers :: Lens' CreateService (Maybe [LoadBalancer])
createService_loadBalancers = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateService' {Maybe [LoadBalancer]
loadBalancers :: Maybe [LoadBalancer]
$sel:loadBalancers:CreateService' :: CreateService -> Maybe [LoadBalancer]
loadBalancers} -> Maybe [LoadBalancer]
loadBalancers) (\s :: CreateService
s@CreateService' {} Maybe [LoadBalancer]
a -> CreateService
s {$sel:loadBalancers:CreateService' :: Maybe [LoadBalancer]
loadBalancers = Maybe [LoadBalancer]
a} :: CreateService) 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 network configuration for the service. This parameter is required
-- for task definitions that use the @awsvpc@ network mode to receive their
-- own elastic network interface, and it isn\'t supported for other network
-- modes. For more information, see
-- <https://docs.aws.amazon.com/AmazonECS/latest/developerguide/task-networking.html Task networking>
-- in the /Amazon Elastic Container Service Developer Guide/.
createService_networkConfiguration :: Lens.Lens' CreateService (Prelude.Maybe NetworkConfiguration)
createService_networkConfiguration :: Lens' CreateService (Maybe NetworkConfiguration)
createService_networkConfiguration = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateService' {Maybe NetworkConfiguration
networkConfiguration :: Maybe NetworkConfiguration
$sel:networkConfiguration:CreateService' :: CreateService -> Maybe NetworkConfiguration
networkConfiguration} -> Maybe NetworkConfiguration
networkConfiguration) (\s :: CreateService
s@CreateService' {} Maybe NetworkConfiguration
a -> CreateService
s {$sel:networkConfiguration:CreateService' :: Maybe NetworkConfiguration
networkConfiguration = Maybe NetworkConfiguration
a} :: CreateService)

-- | An array of placement constraint objects to use for tasks in your
-- service. You can specify a maximum of 10 constraints for each task. This
-- limit includes constraints in the task definition and those specified at
-- runtime.
createService_placementConstraints :: Lens.Lens' CreateService (Prelude.Maybe [PlacementConstraint])
createService_placementConstraints :: Lens' CreateService (Maybe [PlacementConstraint])
createService_placementConstraints = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateService' {Maybe [PlacementConstraint]
placementConstraints :: Maybe [PlacementConstraint]
$sel:placementConstraints:CreateService' :: CreateService -> Maybe [PlacementConstraint]
placementConstraints} -> Maybe [PlacementConstraint]
placementConstraints) (\s :: CreateService
s@CreateService' {} Maybe [PlacementConstraint]
a -> CreateService
s {$sel:placementConstraints:CreateService' :: Maybe [PlacementConstraint]
placementConstraints = Maybe [PlacementConstraint]
a} :: CreateService) 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 objects to use for tasks in your service. You can
-- specify a maximum of 5 strategy rules for each service.
createService_placementStrategy :: Lens.Lens' CreateService (Prelude.Maybe [PlacementStrategy])
createService_placementStrategy :: Lens' CreateService (Maybe [PlacementStrategy])
createService_placementStrategy = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateService' {Maybe [PlacementStrategy]
placementStrategy :: Maybe [PlacementStrategy]
$sel:placementStrategy:CreateService' :: CreateService -> Maybe [PlacementStrategy]
placementStrategy} -> Maybe [PlacementStrategy]
placementStrategy) (\s :: CreateService
s@CreateService' {} Maybe [PlacementStrategy]
a -> CreateService
s {$sel:placementStrategy:CreateService' :: Maybe [PlacementStrategy]
placementStrategy = Maybe [PlacementStrategy]
a} :: CreateService) 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 platform version that your tasks in the service are running on. A
-- platform version is specified only for tasks using the Fargate launch
-- type. 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/.
createService_platformVersion :: Lens.Lens' CreateService (Prelude.Maybe Prelude.Text)
createService_platformVersion :: Lens' CreateService (Maybe Text)
createService_platformVersion = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateService' {Maybe Text
platformVersion :: Maybe Text
$sel:platformVersion:CreateService' :: CreateService -> Maybe Text
platformVersion} -> Maybe Text
platformVersion) (\s :: CreateService
s@CreateService' {} Maybe Text
a -> CreateService
s {$sel:platformVersion:CreateService' :: Maybe Text
platformVersion = Maybe Text
a} :: CreateService)

-- | Specifies whether to propagate the tags from the task definition to the
-- task. If no value is specified, the tags aren\'t propagated. Tags can
-- only be propagated to the task during task creation. To add tags to a
-- task after task creation, use the TagResource API action.
createService_propagateTags :: Lens.Lens' CreateService (Prelude.Maybe PropagateTags)
createService_propagateTags :: Lens' CreateService (Maybe PropagateTags)
createService_propagateTags = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateService' {Maybe PropagateTags
propagateTags :: Maybe PropagateTags
$sel:propagateTags:CreateService' :: CreateService -> Maybe PropagateTags
propagateTags} -> Maybe PropagateTags
propagateTags) (\s :: CreateService
s@CreateService' {} Maybe PropagateTags
a -> CreateService
s {$sel:propagateTags:CreateService' :: Maybe PropagateTags
propagateTags = Maybe PropagateTags
a} :: CreateService)

-- | The name or full Amazon Resource Name (ARN) of the IAM role that allows
-- Amazon ECS to make calls to your load balancer on your behalf. This
-- parameter is only permitted if you are using a load balancer with your
-- service and your task definition doesn\'t use the @awsvpc@ network mode.
-- If you specify the @role@ parameter, you must also specify a load
-- balancer object with the @loadBalancers@ parameter.
--
-- If your account has already created the Amazon ECS service-linked role,
-- that role is used for your service unless you specify a role here. The
-- service-linked role is required if your task definition uses the
-- @awsvpc@ network mode or if the service is configured to use service
-- discovery, an external deployment controller, multiple target groups, or
-- Elastic Inference accelerators in which case you don\'t specify a role
-- here. For more information, see
-- <https://docs.aws.amazon.com/AmazonECS/latest/developerguide/using-service-linked-roles.html Using service-linked roles for Amazon ECS>
-- in the /Amazon Elastic Container Service Developer Guide/.
--
-- If your specified role has a path other than @\/@, then you must either
-- specify the full role ARN (this is recommended) or prefix the role name
-- with the path. For example, if a role with the name @bar@ has a path of
-- @\/foo\/@ then you would specify @\/foo\/bar@ as the role name. For more
-- information, see
-- <https://docs.aws.amazon.com/IAM/latest/UserGuide/reference_identifiers.html#identifiers-friendly-names Friendly names and paths>
-- in the /IAM User Guide/.
createService_role :: Lens.Lens' CreateService (Prelude.Maybe Prelude.Text)
createService_role :: Lens' CreateService (Maybe Text)
createService_role = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateService' {Maybe Text
role' :: Maybe Text
$sel:role':CreateService' :: CreateService -> Maybe Text
role'} -> Maybe Text
role') (\s :: CreateService
s@CreateService' {} Maybe Text
a -> CreateService
s {$sel:role':CreateService' :: Maybe Text
role' = Maybe Text
a} :: CreateService)

-- | 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. This scheduler strategy is required if the service uses
--     the @CODE_DEPLOY@ or @EXTERNAL@ deployment controller types.
--
-- -   @DAEMON@-The daemon scheduling strategy deploys exactly one task on
--     each active container instance that 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 and
--     will stop tasks that don\'t meet the placement constraints. When
--     you\'re using this strategy, you don\'t need to specify a desired
--     number of tasks, a task placement strategy, or use Service Auto
--     Scaling policies.
--
--     Tasks using the Fargate launch type or the @CODE_DEPLOY@ or
--     @EXTERNAL@ deployment controller types don\'t support the @DAEMON@
--     scheduling strategy.
createService_schedulingStrategy :: Lens.Lens' CreateService (Prelude.Maybe SchedulingStrategy)
createService_schedulingStrategy :: Lens' CreateService (Maybe SchedulingStrategy)
createService_schedulingStrategy = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateService' {Maybe SchedulingStrategy
schedulingStrategy :: Maybe SchedulingStrategy
$sel:schedulingStrategy:CreateService' :: CreateService -> Maybe SchedulingStrategy
schedulingStrategy} -> Maybe SchedulingStrategy
schedulingStrategy) (\s :: CreateService
s@CreateService' {} Maybe SchedulingStrategy
a -> CreateService
s {$sel:schedulingStrategy:CreateService' :: Maybe SchedulingStrategy
schedulingStrategy = Maybe SchedulingStrategy
a} :: CreateService)

-- | The configuration for this service to discover and connect to services,
-- and be discovered by, and connected from, other services within a
-- namespace.
--
-- Tasks that run in a namespace can use short names to connect to services
-- in the namespace. Tasks can connect to services across all of the
-- clusters in the namespace. Tasks connect through a managed proxy
-- container that collects logs and metrics for increased visibility. Only
-- the tasks that Amazon ECS services create are supported with Service
-- Connect. For more information, see
-- <https://docs.aws.amazon.com/AmazonECS/latest/developerguide/service-connect.html Service Connect>
-- in the /Amazon Elastic Container Service Developer Guide/.
createService_serviceConnectConfiguration :: Lens.Lens' CreateService (Prelude.Maybe ServiceConnectConfiguration)
createService_serviceConnectConfiguration :: Lens' CreateService (Maybe ServiceConnectConfiguration)
createService_serviceConnectConfiguration = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateService' {Maybe ServiceConnectConfiguration
serviceConnectConfiguration :: Maybe ServiceConnectConfiguration
$sel:serviceConnectConfiguration:CreateService' :: CreateService -> Maybe ServiceConnectConfiguration
serviceConnectConfiguration} -> Maybe ServiceConnectConfiguration
serviceConnectConfiguration) (\s :: CreateService
s@CreateService' {} Maybe ServiceConnectConfiguration
a -> CreateService
s {$sel:serviceConnectConfiguration:CreateService' :: Maybe ServiceConnectConfiguration
serviceConnectConfiguration = Maybe ServiceConnectConfiguration
a} :: CreateService)

-- | The details of the service discovery registry to associate with this
-- service. For more information, see
-- <https://docs.aws.amazon.com/AmazonECS/latest/developerguide/service-discovery.html Service discovery>.
--
-- Each service may be associated with one service registry. Multiple
-- service registries for each service isn\'t supported.
createService_serviceRegistries :: Lens.Lens' CreateService (Prelude.Maybe [ServiceRegistry])
createService_serviceRegistries :: Lens' CreateService (Maybe [ServiceRegistry])
createService_serviceRegistries = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateService' {Maybe [ServiceRegistry]
serviceRegistries :: Maybe [ServiceRegistry]
$sel:serviceRegistries:CreateService' :: CreateService -> Maybe [ServiceRegistry]
serviceRegistries} -> Maybe [ServiceRegistry]
serviceRegistries) (\s :: CreateService
s@CreateService' {} Maybe [ServiceRegistry]
a -> CreateService
s {$sel:serviceRegistries:CreateService' :: Maybe [ServiceRegistry]
serviceRegistries = Maybe [ServiceRegistry]
a} :: CreateService) 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 metadata that you apply to the service to help you categorize and
-- organize them. Each tag consists of a key and an optional value, both of
-- which you define. When a service is deleted, the tags are deleted as
-- well.
--
-- 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.
createService_tags :: Lens.Lens' CreateService (Prelude.Maybe [Tag])
createService_tags :: Lens' CreateService (Maybe [Tag])
createService_tags = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateService' {Maybe [Tag]
tags :: Maybe [Tag]
$sel:tags:CreateService' :: CreateService -> Maybe [Tag]
tags} -> Maybe [Tag]
tags) (\s :: CreateService
s@CreateService' {} Maybe [Tag]
a -> CreateService
s {$sel:tags:CreateService' :: Maybe [Tag]
tags = Maybe [Tag]
a} :: CreateService) 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 @family@ and @revision@ (@family:revision@) or full ARN of the task
-- definition to run in your service. If a @revision@ isn\'t specified, the
-- latest @ACTIVE@ revision is used.
--
-- A task definition must be specified if the service uses either the @ECS@
-- or @CODE_DEPLOY@ deployment controllers.
createService_taskDefinition :: Lens.Lens' CreateService (Prelude.Maybe Prelude.Text)
createService_taskDefinition :: Lens' CreateService (Maybe Text)
createService_taskDefinition = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateService' {Maybe Text
taskDefinition :: Maybe Text
$sel:taskDefinition:CreateService' :: CreateService -> Maybe Text
taskDefinition} -> Maybe Text
taskDefinition) (\s :: CreateService
s@CreateService' {} Maybe Text
a -> CreateService
s {$sel:taskDefinition:CreateService' :: Maybe Text
taskDefinition = Maybe Text
a} :: CreateService)

-- | 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, but you can have similarly named services in
-- multiple clusters within a Region or across multiple Regions.
createService_serviceName :: Lens.Lens' CreateService Prelude.Text
createService_serviceName :: Lens' CreateService Text
createService_serviceName = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateService' {Text
serviceName :: Text
$sel:serviceName:CreateService' :: CreateService -> Text
serviceName} -> Text
serviceName) (\s :: CreateService
s@CreateService' {} Text
a -> CreateService
s {$sel:serviceName:CreateService' :: Text
serviceName = Text
a} :: CreateService)

instance Core.AWSRequest CreateService where
  type
    AWSResponse CreateService =
      CreateServiceResponse
  request :: (Service -> Service) -> CreateService -> Request CreateService
request Service -> Service
overrides =
    forall a. (ToRequest a, ToJSON a) => Service -> a -> Request a
Request.postJSON (Service -> Service
overrides Service
defaultService)
  response :: forall (m :: * -> *).
MonadResource m =>
(ByteStringLazy -> IO ByteStringLazy)
-> Service
-> Proxy CreateService
-> ClientResponse ClientBody
-> m (Either Error (ClientResponse (AWSResponse CreateService)))
response =
    forall (m :: * -> *) a.
MonadResource m =>
(Int -> ResponseHeaders -> Object -> Either String (AWSResponse a))
-> (ByteStringLazy -> IO ByteStringLazy)
-> Service
-> Proxy a
-> ClientResponse ClientBody
-> m (Either Error (ClientResponse (AWSResponse a)))
Response.receiveJSON
      ( \Int
s ResponseHeaders
h Object
x ->
          Maybe ContainerService -> Int -> CreateServiceResponse
CreateServiceResponse'
            forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"service")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure (forall a. Enum a => a -> Int
Prelude.fromEnum Int
s))
      )

instance Prelude.Hashable CreateService where
  hashWithSalt :: Int -> CreateService -> Int
hashWithSalt Int
_salt CreateService' {Maybe Bool
Maybe Int
Maybe [CapacityProviderStrategyItem]
Maybe [LoadBalancer]
Maybe [PlacementConstraint]
Maybe [PlacementStrategy]
Maybe [ServiceRegistry]
Maybe [Tag]
Maybe Text
Maybe DeploymentConfiguration
Maybe DeploymentController
Maybe LaunchType
Maybe NetworkConfiguration
Maybe PropagateTags
Maybe SchedulingStrategy
Maybe ServiceConnectConfiguration
Text
serviceName :: Text
taskDefinition :: Maybe Text
tags :: Maybe [Tag]
serviceRegistries :: Maybe [ServiceRegistry]
serviceConnectConfiguration :: Maybe ServiceConnectConfiguration
schedulingStrategy :: Maybe SchedulingStrategy
role' :: Maybe Text
propagateTags :: Maybe PropagateTags
platformVersion :: Maybe Text
placementStrategy :: Maybe [PlacementStrategy]
placementConstraints :: Maybe [PlacementConstraint]
networkConfiguration :: Maybe NetworkConfiguration
loadBalancers :: Maybe [LoadBalancer]
launchType :: Maybe LaunchType
healthCheckGracePeriodSeconds :: Maybe Int
enableExecuteCommand :: Maybe Bool
enableECSManagedTags :: Maybe Bool
desiredCount :: Maybe Int
deploymentController :: Maybe DeploymentController
deploymentConfiguration :: Maybe DeploymentConfiguration
cluster :: Maybe Text
clientToken :: Maybe Text
capacityProviderStrategy :: Maybe [CapacityProviderStrategyItem]
$sel:serviceName:CreateService' :: CreateService -> Text
$sel:taskDefinition:CreateService' :: CreateService -> Maybe Text
$sel:tags:CreateService' :: CreateService -> Maybe [Tag]
$sel:serviceRegistries:CreateService' :: CreateService -> Maybe [ServiceRegistry]
$sel:serviceConnectConfiguration:CreateService' :: CreateService -> Maybe ServiceConnectConfiguration
$sel:schedulingStrategy:CreateService' :: CreateService -> Maybe SchedulingStrategy
$sel:role':CreateService' :: CreateService -> Maybe Text
$sel:propagateTags:CreateService' :: CreateService -> Maybe PropagateTags
$sel:platformVersion:CreateService' :: CreateService -> Maybe Text
$sel:placementStrategy:CreateService' :: CreateService -> Maybe [PlacementStrategy]
$sel:placementConstraints:CreateService' :: CreateService -> Maybe [PlacementConstraint]
$sel:networkConfiguration:CreateService' :: CreateService -> Maybe NetworkConfiguration
$sel:loadBalancers:CreateService' :: CreateService -> Maybe [LoadBalancer]
$sel:launchType:CreateService' :: CreateService -> Maybe LaunchType
$sel:healthCheckGracePeriodSeconds:CreateService' :: CreateService -> Maybe Int
$sel:enableExecuteCommand:CreateService' :: CreateService -> Maybe Bool
$sel:enableECSManagedTags:CreateService' :: CreateService -> Maybe Bool
$sel:desiredCount:CreateService' :: CreateService -> Maybe Int
$sel:deploymentController:CreateService' :: CreateService -> Maybe DeploymentController
$sel:deploymentConfiguration:CreateService' :: CreateService -> Maybe DeploymentConfiguration
$sel:cluster:CreateService' :: CreateService -> Maybe Text
$sel:clientToken:CreateService' :: CreateService -> Maybe Text
$sel:capacityProviderStrategy:CreateService' :: CreateService -> 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
clientToken
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
cluster
      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 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 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 [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
platformVersion
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe PropagateTags
propagateTags
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
role'
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe SchedulingStrategy
schedulingStrategy
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe ServiceConnectConfiguration
serviceConnectConfiguration
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe [ServiceRegistry]
serviceRegistries
      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` Text
serviceName

instance Prelude.NFData CreateService where
  rnf :: CreateService -> ()
rnf CreateService' {Maybe Bool
Maybe Int
Maybe [CapacityProviderStrategyItem]
Maybe [LoadBalancer]
Maybe [PlacementConstraint]
Maybe [PlacementStrategy]
Maybe [ServiceRegistry]
Maybe [Tag]
Maybe Text
Maybe DeploymentConfiguration
Maybe DeploymentController
Maybe LaunchType
Maybe NetworkConfiguration
Maybe PropagateTags
Maybe SchedulingStrategy
Maybe ServiceConnectConfiguration
Text
serviceName :: Text
taskDefinition :: Maybe Text
tags :: Maybe [Tag]
serviceRegistries :: Maybe [ServiceRegistry]
serviceConnectConfiguration :: Maybe ServiceConnectConfiguration
schedulingStrategy :: Maybe SchedulingStrategy
role' :: Maybe Text
propagateTags :: Maybe PropagateTags
platformVersion :: Maybe Text
placementStrategy :: Maybe [PlacementStrategy]
placementConstraints :: Maybe [PlacementConstraint]
networkConfiguration :: Maybe NetworkConfiguration
loadBalancers :: Maybe [LoadBalancer]
launchType :: Maybe LaunchType
healthCheckGracePeriodSeconds :: Maybe Int
enableExecuteCommand :: Maybe Bool
enableECSManagedTags :: Maybe Bool
desiredCount :: Maybe Int
deploymentController :: Maybe DeploymentController
deploymentConfiguration :: Maybe DeploymentConfiguration
cluster :: Maybe Text
clientToken :: Maybe Text
capacityProviderStrategy :: Maybe [CapacityProviderStrategyItem]
$sel:serviceName:CreateService' :: CreateService -> Text
$sel:taskDefinition:CreateService' :: CreateService -> Maybe Text
$sel:tags:CreateService' :: CreateService -> Maybe [Tag]
$sel:serviceRegistries:CreateService' :: CreateService -> Maybe [ServiceRegistry]
$sel:serviceConnectConfiguration:CreateService' :: CreateService -> Maybe ServiceConnectConfiguration
$sel:schedulingStrategy:CreateService' :: CreateService -> Maybe SchedulingStrategy
$sel:role':CreateService' :: CreateService -> Maybe Text
$sel:propagateTags:CreateService' :: CreateService -> Maybe PropagateTags
$sel:platformVersion:CreateService' :: CreateService -> Maybe Text
$sel:placementStrategy:CreateService' :: CreateService -> Maybe [PlacementStrategy]
$sel:placementConstraints:CreateService' :: CreateService -> Maybe [PlacementConstraint]
$sel:networkConfiguration:CreateService' :: CreateService -> Maybe NetworkConfiguration
$sel:loadBalancers:CreateService' :: CreateService -> Maybe [LoadBalancer]
$sel:launchType:CreateService' :: CreateService -> Maybe LaunchType
$sel:healthCheckGracePeriodSeconds:CreateService' :: CreateService -> Maybe Int
$sel:enableExecuteCommand:CreateService' :: CreateService -> Maybe Bool
$sel:enableECSManagedTags:CreateService' :: CreateService -> Maybe Bool
$sel:desiredCount:CreateService' :: CreateService -> Maybe Int
$sel:deploymentController:CreateService' :: CreateService -> Maybe DeploymentController
$sel:deploymentConfiguration:CreateService' :: CreateService -> Maybe DeploymentConfiguration
$sel:cluster:CreateService' :: CreateService -> Maybe Text
$sel:clientToken:CreateService' :: CreateService -> Maybe Text
$sel:capacityProviderStrategy:CreateService' :: CreateService -> 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
clientToken
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
cluster
      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 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 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 [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
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
role'
      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 ServiceConnectConfiguration
serviceConnectConfiguration
      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 [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 Text
serviceName

instance Data.ToHeaders CreateService where
  toHeaders :: CreateService -> ResponseHeaders
toHeaders =
    forall a b. a -> b -> a
Prelude.const
      ( forall a. Monoid a => [a] -> a
Prelude.mconcat
          [ HeaderName
"X-Amz-Target"
              forall a. ToHeader a => HeaderName -> a -> ResponseHeaders
Data.=# ( ByteString
"AmazonEC2ContainerServiceV20141113.CreateService" ::
                          Prelude.ByteString
                      ),
            HeaderName
"Content-Type"
              forall a. ToHeader a => HeaderName -> a -> ResponseHeaders
Data.=# ( ByteString
"application/x-amz-json-1.1" ::
                          Prelude.ByteString
                      )
          ]
      )

instance Data.ToJSON CreateService where
  toJSON :: CreateService -> Value
toJSON CreateService' {Maybe Bool
Maybe Int
Maybe [CapacityProviderStrategyItem]
Maybe [LoadBalancer]
Maybe [PlacementConstraint]
Maybe [PlacementStrategy]
Maybe [ServiceRegistry]
Maybe [Tag]
Maybe Text
Maybe DeploymentConfiguration
Maybe DeploymentController
Maybe LaunchType
Maybe NetworkConfiguration
Maybe PropagateTags
Maybe SchedulingStrategy
Maybe ServiceConnectConfiguration
Text
serviceName :: Text
taskDefinition :: Maybe Text
tags :: Maybe [Tag]
serviceRegistries :: Maybe [ServiceRegistry]
serviceConnectConfiguration :: Maybe ServiceConnectConfiguration
schedulingStrategy :: Maybe SchedulingStrategy
role' :: Maybe Text
propagateTags :: Maybe PropagateTags
platformVersion :: Maybe Text
placementStrategy :: Maybe [PlacementStrategy]
placementConstraints :: Maybe [PlacementConstraint]
networkConfiguration :: Maybe NetworkConfiguration
loadBalancers :: Maybe [LoadBalancer]
launchType :: Maybe LaunchType
healthCheckGracePeriodSeconds :: Maybe Int
enableExecuteCommand :: Maybe Bool
enableECSManagedTags :: Maybe Bool
desiredCount :: Maybe Int
deploymentController :: Maybe DeploymentController
deploymentConfiguration :: Maybe DeploymentConfiguration
cluster :: Maybe Text
clientToken :: Maybe Text
capacityProviderStrategy :: Maybe [CapacityProviderStrategyItem]
$sel:serviceName:CreateService' :: CreateService -> Text
$sel:taskDefinition:CreateService' :: CreateService -> Maybe Text
$sel:tags:CreateService' :: CreateService -> Maybe [Tag]
$sel:serviceRegistries:CreateService' :: CreateService -> Maybe [ServiceRegistry]
$sel:serviceConnectConfiguration:CreateService' :: CreateService -> Maybe ServiceConnectConfiguration
$sel:schedulingStrategy:CreateService' :: CreateService -> Maybe SchedulingStrategy
$sel:role':CreateService' :: CreateService -> Maybe Text
$sel:propagateTags:CreateService' :: CreateService -> Maybe PropagateTags
$sel:platformVersion:CreateService' :: CreateService -> Maybe Text
$sel:placementStrategy:CreateService' :: CreateService -> Maybe [PlacementStrategy]
$sel:placementConstraints:CreateService' :: CreateService -> Maybe [PlacementConstraint]
$sel:networkConfiguration:CreateService' :: CreateService -> Maybe NetworkConfiguration
$sel:loadBalancers:CreateService' :: CreateService -> Maybe [LoadBalancer]
$sel:launchType:CreateService' :: CreateService -> Maybe LaunchType
$sel:healthCheckGracePeriodSeconds:CreateService' :: CreateService -> Maybe Int
$sel:enableExecuteCommand:CreateService' :: CreateService -> Maybe Bool
$sel:enableECSManagedTags:CreateService' :: CreateService -> Maybe Bool
$sel:desiredCount:CreateService' :: CreateService -> Maybe Int
$sel:deploymentController:CreateService' :: CreateService -> Maybe DeploymentController
$sel:deploymentConfiguration:CreateService' :: CreateService -> Maybe DeploymentConfiguration
$sel:cluster:CreateService' :: CreateService -> Maybe Text
$sel:clientToken:CreateService' :: CreateService -> Maybe Text
$sel:capacityProviderStrategy:CreateService' :: CreateService -> Maybe [CapacityProviderStrategyItem]
..} =
    [Pair] -> Value
Data.object
      ( forall a. [Maybe a] -> [a]
Prelude.catMaybes
          [ (Key
"capacityProviderStrategy" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [CapacityProviderStrategyItem]
capacityProviderStrategy,
            (Key
"clientToken" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Text
clientToken,
            (Key
"cluster" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Text
cluster,
            (Key
"deploymentConfiguration" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe DeploymentConfiguration
deploymentConfiguration,
            (Key
"deploymentController" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe DeploymentController
deploymentController,
            (Key
"desiredCount" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Int
desiredCount,
            (Key
"enableECSManagedTags" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Bool
enableECSManagedTags,
            (Key
"enableExecuteCommand" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Bool
enableExecuteCommand,
            (Key
"healthCheckGracePeriodSeconds" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Int
healthCheckGracePeriodSeconds,
            (Key
"launchType" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe LaunchType
launchType,
            (Key
"loadBalancers" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [LoadBalancer]
loadBalancers,
            (Key
"networkConfiguration" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe NetworkConfiguration
networkConfiguration,
            (Key
"placementConstraints" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [PlacementConstraint]
placementConstraints,
            (Key
"placementStrategy" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [PlacementStrategy]
placementStrategy,
            (Key
"platformVersion" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Text
platformVersion,
            (Key
"propagateTags" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe PropagateTags
propagateTags,
            (Key
"role" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Text
role',
            (Key
"schedulingStrategy" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe SchedulingStrategy
schedulingStrategy,
            (Key
"serviceConnectConfiguration" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ServiceConnectConfiguration
serviceConnectConfiguration,
            (Key
"serviceRegistries" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [ServiceRegistry]
serviceRegistries,
            (Key
"tags" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [Tag]
tags,
            (Key
"taskDefinition" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Text
taskDefinition,
            forall a. a -> Maybe a
Prelude.Just (Key
"serviceName" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..= Text
serviceName)
          ]
      )

instance Data.ToPath CreateService where
  toPath :: CreateService -> ByteString
toPath = forall a b. a -> b -> a
Prelude.const ByteString
"/"

instance Data.ToQuery CreateService where
  toQuery :: CreateService -> QueryString
toQuery = forall a b. a -> b -> a
Prelude.const forall a. Monoid a => a
Prelude.mempty

-- | /See:/ 'newCreateServiceResponse' smart constructor.
data CreateServiceResponse = CreateServiceResponse'
  { -- | The full description of your service following the create call.
    --
    -- A service will return either a @capacityProviderStrategy@ or
    -- @launchType@ parameter, but not both, depending where one was specified
    -- when it was created.
    --
    -- If a service is using the @ECS@ deployment controller, the
    -- @deploymentController@ and @taskSets@ parameters will not be returned.
    --
    -- if the service uses the @CODE_DEPLOY@ deployment controller, the
    -- @deploymentController@, @taskSets@ and @deployments@ parameters will be
    -- returned, however the @deployments@ parameter will be an empty list.
    CreateServiceResponse -> Maybe ContainerService
service :: Prelude.Maybe ContainerService,
    -- | The response's http status code.
    CreateServiceResponse -> Int
httpStatus :: Prelude.Int
  }
  deriving (CreateServiceResponse -> CreateServiceResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: CreateServiceResponse -> CreateServiceResponse -> Bool
$c/= :: CreateServiceResponse -> CreateServiceResponse -> Bool
== :: CreateServiceResponse -> CreateServiceResponse -> Bool
$c== :: CreateServiceResponse -> CreateServiceResponse -> Bool
Prelude.Eq, ReadPrec [CreateServiceResponse]
ReadPrec CreateServiceResponse
Int -> ReadS CreateServiceResponse
ReadS [CreateServiceResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [CreateServiceResponse]
$creadListPrec :: ReadPrec [CreateServiceResponse]
readPrec :: ReadPrec CreateServiceResponse
$creadPrec :: ReadPrec CreateServiceResponse
readList :: ReadS [CreateServiceResponse]
$creadList :: ReadS [CreateServiceResponse]
readsPrec :: Int -> ReadS CreateServiceResponse
$creadsPrec :: Int -> ReadS CreateServiceResponse
Prelude.Read, Int -> CreateServiceResponse -> ShowS
[CreateServiceResponse] -> ShowS
CreateServiceResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [CreateServiceResponse] -> ShowS
$cshowList :: [CreateServiceResponse] -> ShowS
show :: CreateServiceResponse -> String
$cshow :: CreateServiceResponse -> String
showsPrec :: Int -> CreateServiceResponse -> ShowS
$cshowsPrec :: Int -> CreateServiceResponse -> ShowS
Prelude.Show, forall x. Rep CreateServiceResponse x -> CreateServiceResponse
forall x. CreateServiceResponse -> Rep CreateServiceResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep CreateServiceResponse x -> CreateServiceResponse
$cfrom :: forall x. CreateServiceResponse -> Rep CreateServiceResponse x
Prelude.Generic)

-- |
-- Create a value of 'CreateServiceResponse' 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:
--
-- 'service', 'createServiceResponse_service' - The full description of your service following the create call.
--
-- A service will return either a @capacityProviderStrategy@ or
-- @launchType@ parameter, but not both, depending where one was specified
-- when it was created.
--
-- If a service is using the @ECS@ deployment controller, the
-- @deploymentController@ and @taskSets@ parameters will not be returned.
--
-- if the service uses the @CODE_DEPLOY@ deployment controller, the
-- @deploymentController@, @taskSets@ and @deployments@ parameters will be
-- returned, however the @deployments@ parameter will be an empty list.
--
-- 'httpStatus', 'createServiceResponse_httpStatus' - The response's http status code.
newCreateServiceResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  CreateServiceResponse
newCreateServiceResponse :: Int -> CreateServiceResponse
newCreateServiceResponse Int
pHttpStatus_ =
  CreateServiceResponse'
    { $sel:service:CreateServiceResponse' :: Maybe ContainerService
service = forall a. Maybe a
Prelude.Nothing,
      $sel:httpStatus:CreateServiceResponse' :: Int
httpStatus = Int
pHttpStatus_
    }

-- | The full description of your service following the create call.
--
-- A service will return either a @capacityProviderStrategy@ or
-- @launchType@ parameter, but not both, depending where one was specified
-- when it was created.
--
-- If a service is using the @ECS@ deployment controller, the
-- @deploymentController@ and @taskSets@ parameters will not be returned.
--
-- if the service uses the @CODE_DEPLOY@ deployment controller, the
-- @deploymentController@, @taskSets@ and @deployments@ parameters will be
-- returned, however the @deployments@ parameter will be an empty list.
createServiceResponse_service :: Lens.Lens' CreateServiceResponse (Prelude.Maybe ContainerService)
createServiceResponse_service :: Lens' CreateServiceResponse (Maybe ContainerService)
createServiceResponse_service = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateServiceResponse' {Maybe ContainerService
service :: Maybe ContainerService
$sel:service:CreateServiceResponse' :: CreateServiceResponse -> Maybe ContainerService
service} -> Maybe ContainerService
service) (\s :: CreateServiceResponse
s@CreateServiceResponse' {} Maybe ContainerService
a -> CreateServiceResponse
s {$sel:service:CreateServiceResponse' :: Maybe ContainerService
service = Maybe ContainerService
a} :: CreateServiceResponse)

-- | The response's http status code.
createServiceResponse_httpStatus :: Lens.Lens' CreateServiceResponse Prelude.Int
createServiceResponse_httpStatus :: Lens' CreateServiceResponse Int
createServiceResponse_httpStatus = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateServiceResponse' {Int
httpStatus :: Int
$sel:httpStatus:CreateServiceResponse' :: CreateServiceResponse -> Int
httpStatus} -> Int
httpStatus) (\s :: CreateServiceResponse
s@CreateServiceResponse' {} Int
a -> CreateServiceResponse
s {$sel:httpStatus:CreateServiceResponse' :: Int
httpStatus = Int
a} :: CreateServiceResponse)

instance Prelude.NFData CreateServiceResponse where
  rnf :: CreateServiceResponse -> ()
rnf CreateServiceResponse' {Int
Maybe ContainerService
httpStatus :: Int
service :: Maybe ContainerService
$sel:httpStatus:CreateServiceResponse' :: CreateServiceResponse -> Int
$sel:service:CreateServiceResponse' :: CreateServiceResponse -> Maybe ContainerService
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe ContainerService
service
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Int
httpStatus