{-# 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.AppStream.UpdateFleet
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
--
-- Updates the specified fleet.
--
-- If the fleet is in the @STOPPED@ state, you can update any attribute
-- except the fleet name.
--
-- If the fleet is in the @RUNNING@ state, you can update the following
-- based on the fleet type:
--
-- -   Always-On and On-Demand fleet types
--
--     You can update the @DisplayName@, @ComputeCapacity@, @ImageARN@,
--     @ImageName@, @IdleDisconnectTimeoutInSeconds@, and
--     @DisconnectTimeoutInSeconds@ attributes.
--
-- -   Elastic fleet type
--
--     You can update the @DisplayName@, @IdleDisconnectTimeoutInSeconds@,
--     @DisconnectTimeoutInSeconds@, @MaxConcurrentSessions@,
--     @SessionScriptS3Location@ and @UsbDeviceFilterStrings@ attributes.
--
-- If the fleet is in the @STARTING@ or @STOPPED@ state, you can\'t update
-- it.
module Amazonka.AppStream.UpdateFleet
  ( -- * Creating a Request
    UpdateFleet (..),
    newUpdateFleet,

    -- * Request Lenses
    updateFleet_attributesToDelete,
    updateFleet_computeCapacity,
    updateFleet_deleteVpcConfig,
    updateFleet_description,
    updateFleet_disconnectTimeoutInSeconds,
    updateFleet_displayName,
    updateFleet_domainJoinInfo,
    updateFleet_enableDefaultInternetAccess,
    updateFleet_iamRoleArn,
    updateFleet_idleDisconnectTimeoutInSeconds,
    updateFleet_imageArn,
    updateFleet_imageName,
    updateFleet_instanceType,
    updateFleet_maxConcurrentSessions,
    updateFleet_maxUserDurationInSeconds,
    updateFleet_name,
    updateFleet_platform,
    updateFleet_sessionScriptS3Location,
    updateFleet_streamView,
    updateFleet_usbDeviceFilterStrings,
    updateFleet_vpcConfig,

    -- * Destructuring the Response
    UpdateFleetResponse (..),
    newUpdateFleetResponse,

    -- * Response Lenses
    updateFleetResponse_fleet,
    updateFleetResponse_httpStatus,
  )
where

import Amazonka.AppStream.Types
import qualified Amazonka.Core as Core
import qualified Amazonka.Core.Lens.Internal as Lens
import qualified Amazonka.Data as Data
import qualified Amazonka.Prelude as Prelude
import qualified Amazonka.Request as Request
import qualified Amazonka.Response as Response

-- | /See:/ 'newUpdateFleet' smart constructor.
data UpdateFleet = UpdateFleet'
  { -- | The fleet attributes to delete.
    UpdateFleet -> Maybe [FleetAttribute]
attributesToDelete :: Prelude.Maybe [FleetAttribute],
    -- | The desired capacity for the fleet. This is not allowed for Elastic
    -- fleets.
    UpdateFleet -> Maybe ComputeCapacity
computeCapacity :: Prelude.Maybe ComputeCapacity,
    -- | Deletes the VPC association for the specified fleet.
    UpdateFleet -> Maybe Bool
deleteVpcConfig :: Prelude.Maybe Prelude.Bool,
    -- | The description to display.
    UpdateFleet -> Maybe Text
description :: Prelude.Maybe Prelude.Text,
    -- | The amount of time that a streaming session remains active after users
    -- disconnect. If users try to reconnect to the streaming session after a
    -- disconnection or network interruption within this time interval, they
    -- are connected to their previous session. Otherwise, they are connected
    -- to a new session with a new streaming instance.
    --
    -- Specify a value between 60 and 360000.
    UpdateFleet -> Maybe Int
disconnectTimeoutInSeconds :: Prelude.Maybe Prelude.Int,
    -- | The fleet name to display.
    UpdateFleet -> Maybe Text
displayName :: Prelude.Maybe Prelude.Text,
    -- | The name of the directory and organizational unit (OU) to use to join
    -- the fleet to a Microsoft Active Directory domain.
    UpdateFleet -> Maybe DomainJoinInfo
domainJoinInfo :: Prelude.Maybe DomainJoinInfo,
    -- | Enables or disables default internet access for the fleet.
    UpdateFleet -> Maybe Bool
enableDefaultInternetAccess :: Prelude.Maybe Prelude.Bool,
    -- | The Amazon Resource Name (ARN) of the IAM role to apply to the fleet. To
    -- assume a role, a fleet instance calls the AWS Security Token Service
    -- (STS) @AssumeRole@ API operation and passes the ARN of the role to use.
    -- The operation creates a new session with temporary credentials.
    -- AppStream 2.0 retrieves the temporary credentials and creates the
    -- __appstream_machine_role__ credential profile on the instance.
    --
    -- For more information, see
    -- <https://docs.aws.amazon.com/appstream2/latest/developerguide/using-iam-roles-to-grant-permissions-to-applications-scripts-streaming-instances.html Using an IAM Role to Grant Permissions to Applications and Scripts Running on AppStream 2.0 Streaming Instances>
    -- in the /Amazon AppStream 2.0 Administration Guide/.
    UpdateFleet -> Maybe Text
iamRoleArn :: Prelude.Maybe Prelude.Text,
    -- | The amount of time that users can be idle (inactive) before they are
    -- disconnected from their streaming session and the
    -- @DisconnectTimeoutInSeconds@ time interval begins. Users are notified
    -- before they are disconnected due to inactivity. If users try to
    -- reconnect to the streaming session before the time interval specified in
    -- @DisconnectTimeoutInSeconds@ elapses, they are connected to their
    -- previous session. Users are considered idle when they stop providing
    -- keyboard or mouse input during their streaming session. File uploads and
    -- downloads, audio in, audio out, and pixels changing do not qualify as
    -- user activity. If users continue to be idle after the time interval in
    -- @IdleDisconnectTimeoutInSeconds@ elapses, they are disconnected.
    --
    -- To prevent users from being disconnected due to inactivity, specify a
    -- value of 0. Otherwise, specify a value between 60 and 3600. The default
    -- value is 0.
    --
    -- If you enable this feature, we recommend that you specify a value that
    -- corresponds exactly to a whole number of minutes (for example, 60, 120,
    -- and 180). If you don\'t do this, the value is rounded to the nearest
    -- minute. For example, if you specify a value of 70, users are
    -- disconnected after 1 minute of inactivity. If you specify a value that
    -- is at the midpoint between two different minutes, the value is rounded
    -- up. For example, if you specify a value of 90, users are disconnected
    -- after 2 minutes of inactivity.
    UpdateFleet -> Maybe Int
idleDisconnectTimeoutInSeconds :: Prelude.Maybe Prelude.Int,
    -- | The ARN of the public, private, or shared image to use.
    UpdateFleet -> Maybe Text
imageArn :: Prelude.Maybe Prelude.Text,
    -- | The name of the image used to create the fleet.
    UpdateFleet -> Maybe Text
imageName :: Prelude.Maybe Prelude.Text,
    -- | The instance type to use when launching fleet instances. The following
    -- instance types are available:
    --
    -- -   stream.standard.small
    --
    -- -   stream.standard.medium
    --
    -- -   stream.standard.large
    --
    -- -   stream.standard.xlarge
    --
    -- -   stream.standard.2xlarge
    --
    -- -   stream.compute.large
    --
    -- -   stream.compute.xlarge
    --
    -- -   stream.compute.2xlarge
    --
    -- -   stream.compute.4xlarge
    --
    -- -   stream.compute.8xlarge
    --
    -- -   stream.memory.large
    --
    -- -   stream.memory.xlarge
    --
    -- -   stream.memory.2xlarge
    --
    -- -   stream.memory.4xlarge
    --
    -- -   stream.memory.8xlarge
    --
    -- -   stream.memory.z1d.large
    --
    -- -   stream.memory.z1d.xlarge
    --
    -- -   stream.memory.z1d.2xlarge
    --
    -- -   stream.memory.z1d.3xlarge
    --
    -- -   stream.memory.z1d.6xlarge
    --
    -- -   stream.memory.z1d.12xlarge
    --
    -- -   stream.graphics-design.large
    --
    -- -   stream.graphics-design.xlarge
    --
    -- -   stream.graphics-design.2xlarge
    --
    -- -   stream.graphics-design.4xlarge
    --
    -- -   stream.graphics-desktop.2xlarge
    --
    -- -   stream.graphics.g4dn.xlarge
    --
    -- -   stream.graphics.g4dn.2xlarge
    --
    -- -   stream.graphics.g4dn.4xlarge
    --
    -- -   stream.graphics.g4dn.8xlarge
    --
    -- -   stream.graphics.g4dn.12xlarge
    --
    -- -   stream.graphics.g4dn.16xlarge
    --
    -- -   stream.graphics-pro.4xlarge
    --
    -- -   stream.graphics-pro.8xlarge
    --
    -- -   stream.graphics-pro.16xlarge
    --
    -- The following instance types are available for Elastic fleets:
    --
    -- -   stream.standard.small
    --
    -- -   stream.standard.medium
    --
    -- -   stream.standard.large
    --
    -- -   stream.standard.xlarge
    --
    -- -   stream.standard.2xlarge
    UpdateFleet -> Maybe Text
instanceType :: Prelude.Maybe Prelude.Text,
    -- | The maximum number of concurrent sessions for a fleet.
    UpdateFleet -> Maybe Int
maxConcurrentSessions :: Prelude.Maybe Prelude.Int,
    -- | The maximum amount of time that a streaming session can remain active,
    -- in seconds. If users are still connected to a streaming instance five
    -- minutes before this limit is reached, they are prompted to save any open
    -- documents before being disconnected. After this time elapses, the
    -- instance is terminated and replaced by a new instance.
    --
    -- Specify a value between 600 and 360000.
    UpdateFleet -> Maybe Int
maxUserDurationInSeconds :: Prelude.Maybe Prelude.Int,
    -- | A unique name for the fleet.
    UpdateFleet -> Maybe Text
name :: Prelude.Maybe Prelude.Text,
    -- | The platform of the fleet. WINDOWS_SERVER_2019 and AMAZON_LINUX2 are
    -- supported for Elastic fleets.
    UpdateFleet -> Maybe PlatformType
platform :: Prelude.Maybe PlatformType,
    -- | The S3 location of the session scripts configuration zip file. This only
    -- applies to Elastic fleets.
    UpdateFleet -> Maybe S3Location
sessionScriptS3Location :: Prelude.Maybe S3Location,
    -- | The AppStream 2.0 view that is displayed to your users when they stream
    -- from the fleet. When @APP@ is specified, only the windows of
    -- applications opened by users display. When @DESKTOP@ is specified, the
    -- standard desktop that is provided by the operating system displays.
    --
    -- The default value is @APP@.
    UpdateFleet -> Maybe StreamView
streamView :: Prelude.Maybe StreamView,
    -- | The USB device filter strings that specify which USB devices a user can
    -- redirect to the fleet streaming session, when using the Windows native
    -- client. This is allowed but not required for Elastic fleets.
    UpdateFleet -> Maybe [Text]
usbDeviceFilterStrings :: Prelude.Maybe [Prelude.Text],
    -- | The VPC configuration for the fleet. This is required for Elastic
    -- fleets, but not required for other fleet types. Elastic fleets require
    -- that you specify at least two subnets in different availability zones.
    UpdateFleet -> Maybe VpcConfig
vpcConfig :: Prelude.Maybe VpcConfig
  }
  deriving (UpdateFleet -> UpdateFleet -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: UpdateFleet -> UpdateFleet -> Bool
$c/= :: UpdateFleet -> UpdateFleet -> Bool
== :: UpdateFleet -> UpdateFleet -> Bool
$c== :: UpdateFleet -> UpdateFleet -> Bool
Prelude.Eq, ReadPrec [UpdateFleet]
ReadPrec UpdateFleet
Int -> ReadS UpdateFleet
ReadS [UpdateFleet]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [UpdateFleet]
$creadListPrec :: ReadPrec [UpdateFleet]
readPrec :: ReadPrec UpdateFleet
$creadPrec :: ReadPrec UpdateFleet
readList :: ReadS [UpdateFleet]
$creadList :: ReadS [UpdateFleet]
readsPrec :: Int -> ReadS UpdateFleet
$creadsPrec :: Int -> ReadS UpdateFleet
Prelude.Read, Int -> UpdateFleet -> ShowS
[UpdateFleet] -> ShowS
UpdateFleet -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [UpdateFleet] -> ShowS
$cshowList :: [UpdateFleet] -> ShowS
show :: UpdateFleet -> String
$cshow :: UpdateFleet -> String
showsPrec :: Int -> UpdateFleet -> ShowS
$cshowsPrec :: Int -> UpdateFleet -> ShowS
Prelude.Show, forall x. Rep UpdateFleet x -> UpdateFleet
forall x. UpdateFleet -> Rep UpdateFleet x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep UpdateFleet x -> UpdateFleet
$cfrom :: forall x. UpdateFleet -> Rep UpdateFleet x
Prelude.Generic)

-- |
-- Create a value of 'UpdateFleet' 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:
--
-- 'attributesToDelete', 'updateFleet_attributesToDelete' - The fleet attributes to delete.
--
-- 'computeCapacity', 'updateFleet_computeCapacity' - The desired capacity for the fleet. This is not allowed for Elastic
-- fleets.
--
-- 'deleteVpcConfig', 'updateFleet_deleteVpcConfig' - Deletes the VPC association for the specified fleet.
--
-- 'description', 'updateFleet_description' - The description to display.
--
-- 'disconnectTimeoutInSeconds', 'updateFleet_disconnectTimeoutInSeconds' - The amount of time that a streaming session remains active after users
-- disconnect. If users try to reconnect to the streaming session after a
-- disconnection or network interruption within this time interval, they
-- are connected to their previous session. Otherwise, they are connected
-- to a new session with a new streaming instance.
--
-- Specify a value between 60 and 360000.
--
-- 'displayName', 'updateFleet_displayName' - The fleet name to display.
--
-- 'domainJoinInfo', 'updateFleet_domainJoinInfo' - The name of the directory and organizational unit (OU) to use to join
-- the fleet to a Microsoft Active Directory domain.
--
-- 'enableDefaultInternetAccess', 'updateFleet_enableDefaultInternetAccess' - Enables or disables default internet access for the fleet.
--
-- 'iamRoleArn', 'updateFleet_iamRoleArn' - The Amazon Resource Name (ARN) of the IAM role to apply to the fleet. To
-- assume a role, a fleet instance calls the AWS Security Token Service
-- (STS) @AssumeRole@ API operation and passes the ARN of the role to use.
-- The operation creates a new session with temporary credentials.
-- AppStream 2.0 retrieves the temporary credentials and creates the
-- __appstream_machine_role__ credential profile on the instance.
--
-- For more information, see
-- <https://docs.aws.amazon.com/appstream2/latest/developerguide/using-iam-roles-to-grant-permissions-to-applications-scripts-streaming-instances.html Using an IAM Role to Grant Permissions to Applications and Scripts Running on AppStream 2.0 Streaming Instances>
-- in the /Amazon AppStream 2.0 Administration Guide/.
--
-- 'idleDisconnectTimeoutInSeconds', 'updateFleet_idleDisconnectTimeoutInSeconds' - The amount of time that users can be idle (inactive) before they are
-- disconnected from their streaming session and the
-- @DisconnectTimeoutInSeconds@ time interval begins. Users are notified
-- before they are disconnected due to inactivity. If users try to
-- reconnect to the streaming session before the time interval specified in
-- @DisconnectTimeoutInSeconds@ elapses, they are connected to their
-- previous session. Users are considered idle when they stop providing
-- keyboard or mouse input during their streaming session. File uploads and
-- downloads, audio in, audio out, and pixels changing do not qualify as
-- user activity. If users continue to be idle after the time interval in
-- @IdleDisconnectTimeoutInSeconds@ elapses, they are disconnected.
--
-- To prevent users from being disconnected due to inactivity, specify a
-- value of 0. Otherwise, specify a value between 60 and 3600. The default
-- value is 0.
--
-- If you enable this feature, we recommend that you specify a value that
-- corresponds exactly to a whole number of minutes (for example, 60, 120,
-- and 180). If you don\'t do this, the value is rounded to the nearest
-- minute. For example, if you specify a value of 70, users are
-- disconnected after 1 minute of inactivity. If you specify a value that
-- is at the midpoint between two different minutes, the value is rounded
-- up. For example, if you specify a value of 90, users are disconnected
-- after 2 minutes of inactivity.
--
-- 'imageArn', 'updateFleet_imageArn' - The ARN of the public, private, or shared image to use.
--
-- 'imageName', 'updateFleet_imageName' - The name of the image used to create the fleet.
--
-- 'instanceType', 'updateFleet_instanceType' - The instance type to use when launching fleet instances. The following
-- instance types are available:
--
-- -   stream.standard.small
--
-- -   stream.standard.medium
--
-- -   stream.standard.large
--
-- -   stream.standard.xlarge
--
-- -   stream.standard.2xlarge
--
-- -   stream.compute.large
--
-- -   stream.compute.xlarge
--
-- -   stream.compute.2xlarge
--
-- -   stream.compute.4xlarge
--
-- -   stream.compute.8xlarge
--
-- -   stream.memory.large
--
-- -   stream.memory.xlarge
--
-- -   stream.memory.2xlarge
--
-- -   stream.memory.4xlarge
--
-- -   stream.memory.8xlarge
--
-- -   stream.memory.z1d.large
--
-- -   stream.memory.z1d.xlarge
--
-- -   stream.memory.z1d.2xlarge
--
-- -   stream.memory.z1d.3xlarge
--
-- -   stream.memory.z1d.6xlarge
--
-- -   stream.memory.z1d.12xlarge
--
-- -   stream.graphics-design.large
--
-- -   stream.graphics-design.xlarge
--
-- -   stream.graphics-design.2xlarge
--
-- -   stream.graphics-design.4xlarge
--
-- -   stream.graphics-desktop.2xlarge
--
-- -   stream.graphics.g4dn.xlarge
--
-- -   stream.graphics.g4dn.2xlarge
--
-- -   stream.graphics.g4dn.4xlarge
--
-- -   stream.graphics.g4dn.8xlarge
--
-- -   stream.graphics.g4dn.12xlarge
--
-- -   stream.graphics.g4dn.16xlarge
--
-- -   stream.graphics-pro.4xlarge
--
-- -   stream.graphics-pro.8xlarge
--
-- -   stream.graphics-pro.16xlarge
--
-- The following instance types are available for Elastic fleets:
--
-- -   stream.standard.small
--
-- -   stream.standard.medium
--
-- -   stream.standard.large
--
-- -   stream.standard.xlarge
--
-- -   stream.standard.2xlarge
--
-- 'maxConcurrentSessions', 'updateFleet_maxConcurrentSessions' - The maximum number of concurrent sessions for a fleet.
--
-- 'maxUserDurationInSeconds', 'updateFleet_maxUserDurationInSeconds' - The maximum amount of time that a streaming session can remain active,
-- in seconds. If users are still connected to a streaming instance five
-- minutes before this limit is reached, they are prompted to save any open
-- documents before being disconnected. After this time elapses, the
-- instance is terminated and replaced by a new instance.
--
-- Specify a value between 600 and 360000.
--
-- 'name', 'updateFleet_name' - A unique name for the fleet.
--
-- 'platform', 'updateFleet_platform' - The platform of the fleet. WINDOWS_SERVER_2019 and AMAZON_LINUX2 are
-- supported for Elastic fleets.
--
-- 'sessionScriptS3Location', 'updateFleet_sessionScriptS3Location' - The S3 location of the session scripts configuration zip file. This only
-- applies to Elastic fleets.
--
-- 'streamView', 'updateFleet_streamView' - The AppStream 2.0 view that is displayed to your users when they stream
-- from the fleet. When @APP@ is specified, only the windows of
-- applications opened by users display. When @DESKTOP@ is specified, the
-- standard desktop that is provided by the operating system displays.
--
-- The default value is @APP@.
--
-- 'usbDeviceFilterStrings', 'updateFleet_usbDeviceFilterStrings' - The USB device filter strings that specify which USB devices a user can
-- redirect to the fleet streaming session, when using the Windows native
-- client. This is allowed but not required for Elastic fleets.
--
-- 'vpcConfig', 'updateFleet_vpcConfig' - The VPC configuration for the fleet. This is required for Elastic
-- fleets, but not required for other fleet types. Elastic fleets require
-- that you specify at least two subnets in different availability zones.
newUpdateFleet ::
  UpdateFleet
newUpdateFleet :: UpdateFleet
newUpdateFleet =
  UpdateFleet'
    { $sel:attributesToDelete:UpdateFleet' :: Maybe [FleetAttribute]
attributesToDelete = forall a. Maybe a
Prelude.Nothing,
      $sel:computeCapacity:UpdateFleet' :: Maybe ComputeCapacity
computeCapacity = forall a. Maybe a
Prelude.Nothing,
      $sel:deleteVpcConfig:UpdateFleet' :: Maybe Bool
deleteVpcConfig = forall a. Maybe a
Prelude.Nothing,
      $sel:description:UpdateFleet' :: Maybe Text
description = forall a. Maybe a
Prelude.Nothing,
      $sel:disconnectTimeoutInSeconds:UpdateFleet' :: Maybe Int
disconnectTimeoutInSeconds = forall a. Maybe a
Prelude.Nothing,
      $sel:displayName:UpdateFleet' :: Maybe Text
displayName = forall a. Maybe a
Prelude.Nothing,
      $sel:domainJoinInfo:UpdateFleet' :: Maybe DomainJoinInfo
domainJoinInfo = forall a. Maybe a
Prelude.Nothing,
      $sel:enableDefaultInternetAccess:UpdateFleet' :: Maybe Bool
enableDefaultInternetAccess = forall a. Maybe a
Prelude.Nothing,
      $sel:iamRoleArn:UpdateFleet' :: Maybe Text
iamRoleArn = forall a. Maybe a
Prelude.Nothing,
      $sel:idleDisconnectTimeoutInSeconds:UpdateFleet' :: Maybe Int
idleDisconnectTimeoutInSeconds = forall a. Maybe a
Prelude.Nothing,
      $sel:imageArn:UpdateFleet' :: Maybe Text
imageArn = forall a. Maybe a
Prelude.Nothing,
      $sel:imageName:UpdateFleet' :: Maybe Text
imageName = forall a. Maybe a
Prelude.Nothing,
      $sel:instanceType:UpdateFleet' :: Maybe Text
instanceType = forall a. Maybe a
Prelude.Nothing,
      $sel:maxConcurrentSessions:UpdateFleet' :: Maybe Int
maxConcurrentSessions = forall a. Maybe a
Prelude.Nothing,
      $sel:maxUserDurationInSeconds:UpdateFleet' :: Maybe Int
maxUserDurationInSeconds = forall a. Maybe a
Prelude.Nothing,
      $sel:name:UpdateFleet' :: Maybe Text
name = forall a. Maybe a
Prelude.Nothing,
      $sel:platform:UpdateFleet' :: Maybe PlatformType
platform = forall a. Maybe a
Prelude.Nothing,
      $sel:sessionScriptS3Location:UpdateFleet' :: Maybe S3Location
sessionScriptS3Location = forall a. Maybe a
Prelude.Nothing,
      $sel:streamView:UpdateFleet' :: Maybe StreamView
streamView = forall a. Maybe a
Prelude.Nothing,
      $sel:usbDeviceFilterStrings:UpdateFleet' :: Maybe [Text]
usbDeviceFilterStrings = forall a. Maybe a
Prelude.Nothing,
      $sel:vpcConfig:UpdateFleet' :: Maybe VpcConfig
vpcConfig = forall a. Maybe a
Prelude.Nothing
    }

-- | The fleet attributes to delete.
updateFleet_attributesToDelete :: Lens.Lens' UpdateFleet (Prelude.Maybe [FleetAttribute])
updateFleet_attributesToDelete :: Lens' UpdateFleet (Maybe [FleetAttribute])
updateFleet_attributesToDelete = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateFleet' {Maybe [FleetAttribute]
attributesToDelete :: Maybe [FleetAttribute]
$sel:attributesToDelete:UpdateFleet' :: UpdateFleet -> Maybe [FleetAttribute]
attributesToDelete} -> Maybe [FleetAttribute]
attributesToDelete) (\s :: UpdateFleet
s@UpdateFleet' {} Maybe [FleetAttribute]
a -> UpdateFleet
s {$sel:attributesToDelete:UpdateFleet' :: Maybe [FleetAttribute]
attributesToDelete = Maybe [FleetAttribute]
a} :: UpdateFleet) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping forall s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced

-- | The desired capacity for the fleet. This is not allowed for Elastic
-- fleets.
updateFleet_computeCapacity :: Lens.Lens' UpdateFleet (Prelude.Maybe ComputeCapacity)
updateFleet_computeCapacity :: Lens' UpdateFleet (Maybe ComputeCapacity)
updateFleet_computeCapacity = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateFleet' {Maybe ComputeCapacity
computeCapacity :: Maybe ComputeCapacity
$sel:computeCapacity:UpdateFleet' :: UpdateFleet -> Maybe ComputeCapacity
computeCapacity} -> Maybe ComputeCapacity
computeCapacity) (\s :: UpdateFleet
s@UpdateFleet' {} Maybe ComputeCapacity
a -> UpdateFleet
s {$sel:computeCapacity:UpdateFleet' :: Maybe ComputeCapacity
computeCapacity = Maybe ComputeCapacity
a} :: UpdateFleet)

-- | Deletes the VPC association for the specified fleet.
updateFleet_deleteVpcConfig :: Lens.Lens' UpdateFleet (Prelude.Maybe Prelude.Bool)
updateFleet_deleteVpcConfig :: Lens' UpdateFleet (Maybe Bool)
updateFleet_deleteVpcConfig = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateFleet' {Maybe Bool
deleteVpcConfig :: Maybe Bool
$sel:deleteVpcConfig:UpdateFleet' :: UpdateFleet -> Maybe Bool
deleteVpcConfig} -> Maybe Bool
deleteVpcConfig) (\s :: UpdateFleet
s@UpdateFleet' {} Maybe Bool
a -> UpdateFleet
s {$sel:deleteVpcConfig:UpdateFleet' :: Maybe Bool
deleteVpcConfig = Maybe Bool
a} :: UpdateFleet)

-- | The description to display.
updateFleet_description :: Lens.Lens' UpdateFleet (Prelude.Maybe Prelude.Text)
updateFleet_description :: Lens' UpdateFleet (Maybe Text)
updateFleet_description = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateFleet' {Maybe Text
description :: Maybe Text
$sel:description:UpdateFleet' :: UpdateFleet -> Maybe Text
description} -> Maybe Text
description) (\s :: UpdateFleet
s@UpdateFleet' {} Maybe Text
a -> UpdateFleet
s {$sel:description:UpdateFleet' :: Maybe Text
description = Maybe Text
a} :: UpdateFleet)

-- | The amount of time that a streaming session remains active after users
-- disconnect. If users try to reconnect to the streaming session after a
-- disconnection or network interruption within this time interval, they
-- are connected to their previous session. Otherwise, they are connected
-- to a new session with a new streaming instance.
--
-- Specify a value between 60 and 360000.
updateFleet_disconnectTimeoutInSeconds :: Lens.Lens' UpdateFleet (Prelude.Maybe Prelude.Int)
updateFleet_disconnectTimeoutInSeconds :: Lens' UpdateFleet (Maybe Int)
updateFleet_disconnectTimeoutInSeconds = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateFleet' {Maybe Int
disconnectTimeoutInSeconds :: Maybe Int
$sel:disconnectTimeoutInSeconds:UpdateFleet' :: UpdateFleet -> Maybe Int
disconnectTimeoutInSeconds} -> Maybe Int
disconnectTimeoutInSeconds) (\s :: UpdateFleet
s@UpdateFleet' {} Maybe Int
a -> UpdateFleet
s {$sel:disconnectTimeoutInSeconds:UpdateFleet' :: Maybe Int
disconnectTimeoutInSeconds = Maybe Int
a} :: UpdateFleet)

-- | The fleet name to display.
updateFleet_displayName :: Lens.Lens' UpdateFleet (Prelude.Maybe Prelude.Text)
updateFleet_displayName :: Lens' UpdateFleet (Maybe Text)
updateFleet_displayName = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateFleet' {Maybe Text
displayName :: Maybe Text
$sel:displayName:UpdateFleet' :: UpdateFleet -> Maybe Text
displayName} -> Maybe Text
displayName) (\s :: UpdateFleet
s@UpdateFleet' {} Maybe Text
a -> UpdateFleet
s {$sel:displayName:UpdateFleet' :: Maybe Text
displayName = Maybe Text
a} :: UpdateFleet)

-- | The name of the directory and organizational unit (OU) to use to join
-- the fleet to a Microsoft Active Directory domain.
updateFleet_domainJoinInfo :: Lens.Lens' UpdateFleet (Prelude.Maybe DomainJoinInfo)
updateFleet_domainJoinInfo :: Lens' UpdateFleet (Maybe DomainJoinInfo)
updateFleet_domainJoinInfo = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateFleet' {Maybe DomainJoinInfo
domainJoinInfo :: Maybe DomainJoinInfo
$sel:domainJoinInfo:UpdateFleet' :: UpdateFleet -> Maybe DomainJoinInfo
domainJoinInfo} -> Maybe DomainJoinInfo
domainJoinInfo) (\s :: UpdateFleet
s@UpdateFleet' {} Maybe DomainJoinInfo
a -> UpdateFleet
s {$sel:domainJoinInfo:UpdateFleet' :: Maybe DomainJoinInfo
domainJoinInfo = Maybe DomainJoinInfo
a} :: UpdateFleet)

-- | Enables or disables default internet access for the fleet.
updateFleet_enableDefaultInternetAccess :: Lens.Lens' UpdateFleet (Prelude.Maybe Prelude.Bool)
updateFleet_enableDefaultInternetAccess :: Lens' UpdateFleet (Maybe Bool)
updateFleet_enableDefaultInternetAccess = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateFleet' {Maybe Bool
enableDefaultInternetAccess :: Maybe Bool
$sel:enableDefaultInternetAccess:UpdateFleet' :: UpdateFleet -> Maybe Bool
enableDefaultInternetAccess} -> Maybe Bool
enableDefaultInternetAccess) (\s :: UpdateFleet
s@UpdateFleet' {} Maybe Bool
a -> UpdateFleet
s {$sel:enableDefaultInternetAccess:UpdateFleet' :: Maybe Bool
enableDefaultInternetAccess = Maybe Bool
a} :: UpdateFleet)

-- | The Amazon Resource Name (ARN) of the IAM role to apply to the fleet. To
-- assume a role, a fleet instance calls the AWS Security Token Service
-- (STS) @AssumeRole@ API operation and passes the ARN of the role to use.
-- The operation creates a new session with temporary credentials.
-- AppStream 2.0 retrieves the temporary credentials and creates the
-- __appstream_machine_role__ credential profile on the instance.
--
-- For more information, see
-- <https://docs.aws.amazon.com/appstream2/latest/developerguide/using-iam-roles-to-grant-permissions-to-applications-scripts-streaming-instances.html Using an IAM Role to Grant Permissions to Applications and Scripts Running on AppStream 2.0 Streaming Instances>
-- in the /Amazon AppStream 2.0 Administration Guide/.
updateFleet_iamRoleArn :: Lens.Lens' UpdateFleet (Prelude.Maybe Prelude.Text)
updateFleet_iamRoleArn :: Lens' UpdateFleet (Maybe Text)
updateFleet_iamRoleArn = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateFleet' {Maybe Text
iamRoleArn :: Maybe Text
$sel:iamRoleArn:UpdateFleet' :: UpdateFleet -> Maybe Text
iamRoleArn} -> Maybe Text
iamRoleArn) (\s :: UpdateFleet
s@UpdateFleet' {} Maybe Text
a -> UpdateFleet
s {$sel:iamRoleArn:UpdateFleet' :: Maybe Text
iamRoleArn = Maybe Text
a} :: UpdateFleet)

-- | The amount of time that users can be idle (inactive) before they are
-- disconnected from their streaming session and the
-- @DisconnectTimeoutInSeconds@ time interval begins. Users are notified
-- before they are disconnected due to inactivity. If users try to
-- reconnect to the streaming session before the time interval specified in
-- @DisconnectTimeoutInSeconds@ elapses, they are connected to their
-- previous session. Users are considered idle when they stop providing
-- keyboard or mouse input during their streaming session. File uploads and
-- downloads, audio in, audio out, and pixels changing do not qualify as
-- user activity. If users continue to be idle after the time interval in
-- @IdleDisconnectTimeoutInSeconds@ elapses, they are disconnected.
--
-- To prevent users from being disconnected due to inactivity, specify a
-- value of 0. Otherwise, specify a value between 60 and 3600. The default
-- value is 0.
--
-- If you enable this feature, we recommend that you specify a value that
-- corresponds exactly to a whole number of minutes (for example, 60, 120,
-- and 180). If you don\'t do this, the value is rounded to the nearest
-- minute. For example, if you specify a value of 70, users are
-- disconnected after 1 minute of inactivity. If you specify a value that
-- is at the midpoint between two different minutes, the value is rounded
-- up. For example, if you specify a value of 90, users are disconnected
-- after 2 minutes of inactivity.
updateFleet_idleDisconnectTimeoutInSeconds :: Lens.Lens' UpdateFleet (Prelude.Maybe Prelude.Int)
updateFleet_idleDisconnectTimeoutInSeconds :: Lens' UpdateFleet (Maybe Int)
updateFleet_idleDisconnectTimeoutInSeconds = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateFleet' {Maybe Int
idleDisconnectTimeoutInSeconds :: Maybe Int
$sel:idleDisconnectTimeoutInSeconds:UpdateFleet' :: UpdateFleet -> Maybe Int
idleDisconnectTimeoutInSeconds} -> Maybe Int
idleDisconnectTimeoutInSeconds) (\s :: UpdateFleet
s@UpdateFleet' {} Maybe Int
a -> UpdateFleet
s {$sel:idleDisconnectTimeoutInSeconds:UpdateFleet' :: Maybe Int
idleDisconnectTimeoutInSeconds = Maybe Int
a} :: UpdateFleet)

-- | The ARN of the public, private, or shared image to use.
updateFleet_imageArn :: Lens.Lens' UpdateFleet (Prelude.Maybe Prelude.Text)
updateFleet_imageArn :: Lens' UpdateFleet (Maybe Text)
updateFleet_imageArn = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateFleet' {Maybe Text
imageArn :: Maybe Text
$sel:imageArn:UpdateFleet' :: UpdateFleet -> Maybe Text
imageArn} -> Maybe Text
imageArn) (\s :: UpdateFleet
s@UpdateFleet' {} Maybe Text
a -> UpdateFleet
s {$sel:imageArn:UpdateFleet' :: Maybe Text
imageArn = Maybe Text
a} :: UpdateFleet)

-- | The name of the image used to create the fleet.
updateFleet_imageName :: Lens.Lens' UpdateFleet (Prelude.Maybe Prelude.Text)
updateFleet_imageName :: Lens' UpdateFleet (Maybe Text)
updateFleet_imageName = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateFleet' {Maybe Text
imageName :: Maybe Text
$sel:imageName:UpdateFleet' :: UpdateFleet -> Maybe Text
imageName} -> Maybe Text
imageName) (\s :: UpdateFleet
s@UpdateFleet' {} Maybe Text
a -> UpdateFleet
s {$sel:imageName:UpdateFleet' :: Maybe Text
imageName = Maybe Text
a} :: UpdateFleet)

-- | The instance type to use when launching fleet instances. The following
-- instance types are available:
--
-- -   stream.standard.small
--
-- -   stream.standard.medium
--
-- -   stream.standard.large
--
-- -   stream.standard.xlarge
--
-- -   stream.standard.2xlarge
--
-- -   stream.compute.large
--
-- -   stream.compute.xlarge
--
-- -   stream.compute.2xlarge
--
-- -   stream.compute.4xlarge
--
-- -   stream.compute.8xlarge
--
-- -   stream.memory.large
--
-- -   stream.memory.xlarge
--
-- -   stream.memory.2xlarge
--
-- -   stream.memory.4xlarge
--
-- -   stream.memory.8xlarge
--
-- -   stream.memory.z1d.large
--
-- -   stream.memory.z1d.xlarge
--
-- -   stream.memory.z1d.2xlarge
--
-- -   stream.memory.z1d.3xlarge
--
-- -   stream.memory.z1d.6xlarge
--
-- -   stream.memory.z1d.12xlarge
--
-- -   stream.graphics-design.large
--
-- -   stream.graphics-design.xlarge
--
-- -   stream.graphics-design.2xlarge
--
-- -   stream.graphics-design.4xlarge
--
-- -   stream.graphics-desktop.2xlarge
--
-- -   stream.graphics.g4dn.xlarge
--
-- -   stream.graphics.g4dn.2xlarge
--
-- -   stream.graphics.g4dn.4xlarge
--
-- -   stream.graphics.g4dn.8xlarge
--
-- -   stream.graphics.g4dn.12xlarge
--
-- -   stream.graphics.g4dn.16xlarge
--
-- -   stream.graphics-pro.4xlarge
--
-- -   stream.graphics-pro.8xlarge
--
-- -   stream.graphics-pro.16xlarge
--
-- The following instance types are available for Elastic fleets:
--
-- -   stream.standard.small
--
-- -   stream.standard.medium
--
-- -   stream.standard.large
--
-- -   stream.standard.xlarge
--
-- -   stream.standard.2xlarge
updateFleet_instanceType :: Lens.Lens' UpdateFleet (Prelude.Maybe Prelude.Text)
updateFleet_instanceType :: Lens' UpdateFleet (Maybe Text)
updateFleet_instanceType = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateFleet' {Maybe Text
instanceType :: Maybe Text
$sel:instanceType:UpdateFleet' :: UpdateFleet -> Maybe Text
instanceType} -> Maybe Text
instanceType) (\s :: UpdateFleet
s@UpdateFleet' {} Maybe Text
a -> UpdateFleet
s {$sel:instanceType:UpdateFleet' :: Maybe Text
instanceType = Maybe Text
a} :: UpdateFleet)

-- | The maximum number of concurrent sessions for a fleet.
updateFleet_maxConcurrentSessions :: Lens.Lens' UpdateFleet (Prelude.Maybe Prelude.Int)
updateFleet_maxConcurrentSessions :: Lens' UpdateFleet (Maybe Int)
updateFleet_maxConcurrentSessions = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateFleet' {Maybe Int
maxConcurrentSessions :: Maybe Int
$sel:maxConcurrentSessions:UpdateFleet' :: UpdateFleet -> Maybe Int
maxConcurrentSessions} -> Maybe Int
maxConcurrentSessions) (\s :: UpdateFleet
s@UpdateFleet' {} Maybe Int
a -> UpdateFleet
s {$sel:maxConcurrentSessions:UpdateFleet' :: Maybe Int
maxConcurrentSessions = Maybe Int
a} :: UpdateFleet)

-- | The maximum amount of time that a streaming session can remain active,
-- in seconds. If users are still connected to a streaming instance five
-- minutes before this limit is reached, they are prompted to save any open
-- documents before being disconnected. After this time elapses, the
-- instance is terminated and replaced by a new instance.
--
-- Specify a value between 600 and 360000.
updateFleet_maxUserDurationInSeconds :: Lens.Lens' UpdateFleet (Prelude.Maybe Prelude.Int)
updateFleet_maxUserDurationInSeconds :: Lens' UpdateFleet (Maybe Int)
updateFleet_maxUserDurationInSeconds = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateFleet' {Maybe Int
maxUserDurationInSeconds :: Maybe Int
$sel:maxUserDurationInSeconds:UpdateFleet' :: UpdateFleet -> Maybe Int
maxUserDurationInSeconds} -> Maybe Int
maxUserDurationInSeconds) (\s :: UpdateFleet
s@UpdateFleet' {} Maybe Int
a -> UpdateFleet
s {$sel:maxUserDurationInSeconds:UpdateFleet' :: Maybe Int
maxUserDurationInSeconds = Maybe Int
a} :: UpdateFleet)

-- | A unique name for the fleet.
updateFleet_name :: Lens.Lens' UpdateFleet (Prelude.Maybe Prelude.Text)
updateFleet_name :: Lens' UpdateFleet (Maybe Text)
updateFleet_name = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateFleet' {Maybe Text
name :: Maybe Text
$sel:name:UpdateFleet' :: UpdateFleet -> Maybe Text
name} -> Maybe Text
name) (\s :: UpdateFleet
s@UpdateFleet' {} Maybe Text
a -> UpdateFleet
s {$sel:name:UpdateFleet' :: Maybe Text
name = Maybe Text
a} :: UpdateFleet)

-- | The platform of the fleet. WINDOWS_SERVER_2019 and AMAZON_LINUX2 are
-- supported for Elastic fleets.
updateFleet_platform :: Lens.Lens' UpdateFleet (Prelude.Maybe PlatformType)
updateFleet_platform :: Lens' UpdateFleet (Maybe PlatformType)
updateFleet_platform = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateFleet' {Maybe PlatformType
platform :: Maybe PlatformType
$sel:platform:UpdateFleet' :: UpdateFleet -> Maybe PlatformType
platform} -> Maybe PlatformType
platform) (\s :: UpdateFleet
s@UpdateFleet' {} Maybe PlatformType
a -> UpdateFleet
s {$sel:platform:UpdateFleet' :: Maybe PlatformType
platform = Maybe PlatformType
a} :: UpdateFleet)

-- | The S3 location of the session scripts configuration zip file. This only
-- applies to Elastic fleets.
updateFleet_sessionScriptS3Location :: Lens.Lens' UpdateFleet (Prelude.Maybe S3Location)
updateFleet_sessionScriptS3Location :: Lens' UpdateFleet (Maybe S3Location)
updateFleet_sessionScriptS3Location = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateFleet' {Maybe S3Location
sessionScriptS3Location :: Maybe S3Location
$sel:sessionScriptS3Location:UpdateFleet' :: UpdateFleet -> Maybe S3Location
sessionScriptS3Location} -> Maybe S3Location
sessionScriptS3Location) (\s :: UpdateFleet
s@UpdateFleet' {} Maybe S3Location
a -> UpdateFleet
s {$sel:sessionScriptS3Location:UpdateFleet' :: Maybe S3Location
sessionScriptS3Location = Maybe S3Location
a} :: UpdateFleet)

-- | The AppStream 2.0 view that is displayed to your users when they stream
-- from the fleet. When @APP@ is specified, only the windows of
-- applications opened by users display. When @DESKTOP@ is specified, the
-- standard desktop that is provided by the operating system displays.
--
-- The default value is @APP@.
updateFleet_streamView :: Lens.Lens' UpdateFleet (Prelude.Maybe StreamView)
updateFleet_streamView :: Lens' UpdateFleet (Maybe StreamView)
updateFleet_streamView = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateFleet' {Maybe StreamView
streamView :: Maybe StreamView
$sel:streamView:UpdateFleet' :: UpdateFleet -> Maybe StreamView
streamView} -> Maybe StreamView
streamView) (\s :: UpdateFleet
s@UpdateFleet' {} Maybe StreamView
a -> UpdateFleet
s {$sel:streamView:UpdateFleet' :: Maybe StreamView
streamView = Maybe StreamView
a} :: UpdateFleet)

-- | The USB device filter strings that specify which USB devices a user can
-- redirect to the fleet streaming session, when using the Windows native
-- client. This is allowed but not required for Elastic fleets.
updateFleet_usbDeviceFilterStrings :: Lens.Lens' UpdateFleet (Prelude.Maybe [Prelude.Text])
updateFleet_usbDeviceFilterStrings :: Lens' UpdateFleet (Maybe [Text])
updateFleet_usbDeviceFilterStrings = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateFleet' {Maybe [Text]
usbDeviceFilterStrings :: Maybe [Text]
$sel:usbDeviceFilterStrings:UpdateFleet' :: UpdateFleet -> Maybe [Text]
usbDeviceFilterStrings} -> Maybe [Text]
usbDeviceFilterStrings) (\s :: UpdateFleet
s@UpdateFleet' {} Maybe [Text]
a -> UpdateFleet
s {$sel:usbDeviceFilterStrings:UpdateFleet' :: Maybe [Text]
usbDeviceFilterStrings = Maybe [Text]
a} :: UpdateFleet) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping forall s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced

-- | The VPC configuration for the fleet. This is required for Elastic
-- fleets, but not required for other fleet types. Elastic fleets require
-- that you specify at least two subnets in different availability zones.
updateFleet_vpcConfig :: Lens.Lens' UpdateFleet (Prelude.Maybe VpcConfig)
updateFleet_vpcConfig :: Lens' UpdateFleet (Maybe VpcConfig)
updateFleet_vpcConfig = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateFleet' {Maybe VpcConfig
vpcConfig :: Maybe VpcConfig
$sel:vpcConfig:UpdateFleet' :: UpdateFleet -> Maybe VpcConfig
vpcConfig} -> Maybe VpcConfig
vpcConfig) (\s :: UpdateFleet
s@UpdateFleet' {} Maybe VpcConfig
a -> UpdateFleet
s {$sel:vpcConfig:UpdateFleet' :: Maybe VpcConfig
vpcConfig = Maybe VpcConfig
a} :: UpdateFleet)

instance Core.AWSRequest UpdateFleet where
  type AWSResponse UpdateFleet = UpdateFleetResponse
  request :: (Service -> Service) -> UpdateFleet -> Request UpdateFleet
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 UpdateFleet
-> ClientResponse ClientBody
-> m (Either Error (ClientResponse (AWSResponse UpdateFleet)))
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 Fleet -> Int -> UpdateFleetResponse
UpdateFleetResponse'
            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
"Fleet")
            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 UpdateFleet where
  hashWithSalt :: Int -> UpdateFleet -> Int
hashWithSalt Int
_salt UpdateFleet' {Maybe Bool
Maybe Int
Maybe [Text]
Maybe [FleetAttribute]
Maybe Text
Maybe ComputeCapacity
Maybe DomainJoinInfo
Maybe PlatformType
Maybe S3Location
Maybe StreamView
Maybe VpcConfig
vpcConfig :: Maybe VpcConfig
usbDeviceFilterStrings :: Maybe [Text]
streamView :: Maybe StreamView
sessionScriptS3Location :: Maybe S3Location
platform :: Maybe PlatformType
name :: Maybe Text
maxUserDurationInSeconds :: Maybe Int
maxConcurrentSessions :: Maybe Int
instanceType :: Maybe Text
imageName :: Maybe Text
imageArn :: Maybe Text
idleDisconnectTimeoutInSeconds :: Maybe Int
iamRoleArn :: Maybe Text
enableDefaultInternetAccess :: Maybe Bool
domainJoinInfo :: Maybe DomainJoinInfo
displayName :: Maybe Text
disconnectTimeoutInSeconds :: Maybe Int
description :: Maybe Text
deleteVpcConfig :: Maybe Bool
computeCapacity :: Maybe ComputeCapacity
attributesToDelete :: Maybe [FleetAttribute]
$sel:vpcConfig:UpdateFleet' :: UpdateFleet -> Maybe VpcConfig
$sel:usbDeviceFilterStrings:UpdateFleet' :: UpdateFleet -> Maybe [Text]
$sel:streamView:UpdateFleet' :: UpdateFleet -> Maybe StreamView
$sel:sessionScriptS3Location:UpdateFleet' :: UpdateFleet -> Maybe S3Location
$sel:platform:UpdateFleet' :: UpdateFleet -> Maybe PlatformType
$sel:name:UpdateFleet' :: UpdateFleet -> Maybe Text
$sel:maxUserDurationInSeconds:UpdateFleet' :: UpdateFleet -> Maybe Int
$sel:maxConcurrentSessions:UpdateFleet' :: UpdateFleet -> Maybe Int
$sel:instanceType:UpdateFleet' :: UpdateFleet -> Maybe Text
$sel:imageName:UpdateFleet' :: UpdateFleet -> Maybe Text
$sel:imageArn:UpdateFleet' :: UpdateFleet -> Maybe Text
$sel:idleDisconnectTimeoutInSeconds:UpdateFleet' :: UpdateFleet -> Maybe Int
$sel:iamRoleArn:UpdateFleet' :: UpdateFleet -> Maybe Text
$sel:enableDefaultInternetAccess:UpdateFleet' :: UpdateFleet -> Maybe Bool
$sel:domainJoinInfo:UpdateFleet' :: UpdateFleet -> Maybe DomainJoinInfo
$sel:displayName:UpdateFleet' :: UpdateFleet -> Maybe Text
$sel:disconnectTimeoutInSeconds:UpdateFleet' :: UpdateFleet -> Maybe Int
$sel:description:UpdateFleet' :: UpdateFleet -> Maybe Text
$sel:deleteVpcConfig:UpdateFleet' :: UpdateFleet -> Maybe Bool
$sel:computeCapacity:UpdateFleet' :: UpdateFleet -> Maybe ComputeCapacity
$sel:attributesToDelete:UpdateFleet' :: UpdateFleet -> Maybe [FleetAttribute]
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe [FleetAttribute]
attributesToDelete
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe ComputeCapacity
computeCapacity
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Bool
deleteVpcConfig
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
description
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Int
disconnectTimeoutInSeconds
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
displayName
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe DomainJoinInfo
domainJoinInfo
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Bool
enableDefaultInternetAccess
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
iamRoleArn
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Int
idleDisconnectTimeoutInSeconds
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
imageArn
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
imageName
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
instanceType
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Int
maxConcurrentSessions
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Int
maxUserDurationInSeconds
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
name
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe PlatformType
platform
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe S3Location
sessionScriptS3Location
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe StreamView
streamView
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe [Text]
usbDeviceFilterStrings
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe VpcConfig
vpcConfig

instance Prelude.NFData UpdateFleet where
  rnf :: UpdateFleet -> ()
rnf UpdateFleet' {Maybe Bool
Maybe Int
Maybe [Text]
Maybe [FleetAttribute]
Maybe Text
Maybe ComputeCapacity
Maybe DomainJoinInfo
Maybe PlatformType
Maybe S3Location
Maybe StreamView
Maybe VpcConfig
vpcConfig :: Maybe VpcConfig
usbDeviceFilterStrings :: Maybe [Text]
streamView :: Maybe StreamView
sessionScriptS3Location :: Maybe S3Location
platform :: Maybe PlatformType
name :: Maybe Text
maxUserDurationInSeconds :: Maybe Int
maxConcurrentSessions :: Maybe Int
instanceType :: Maybe Text
imageName :: Maybe Text
imageArn :: Maybe Text
idleDisconnectTimeoutInSeconds :: Maybe Int
iamRoleArn :: Maybe Text
enableDefaultInternetAccess :: Maybe Bool
domainJoinInfo :: Maybe DomainJoinInfo
displayName :: Maybe Text
disconnectTimeoutInSeconds :: Maybe Int
description :: Maybe Text
deleteVpcConfig :: Maybe Bool
computeCapacity :: Maybe ComputeCapacity
attributesToDelete :: Maybe [FleetAttribute]
$sel:vpcConfig:UpdateFleet' :: UpdateFleet -> Maybe VpcConfig
$sel:usbDeviceFilterStrings:UpdateFleet' :: UpdateFleet -> Maybe [Text]
$sel:streamView:UpdateFleet' :: UpdateFleet -> Maybe StreamView
$sel:sessionScriptS3Location:UpdateFleet' :: UpdateFleet -> Maybe S3Location
$sel:platform:UpdateFleet' :: UpdateFleet -> Maybe PlatformType
$sel:name:UpdateFleet' :: UpdateFleet -> Maybe Text
$sel:maxUserDurationInSeconds:UpdateFleet' :: UpdateFleet -> Maybe Int
$sel:maxConcurrentSessions:UpdateFleet' :: UpdateFleet -> Maybe Int
$sel:instanceType:UpdateFleet' :: UpdateFleet -> Maybe Text
$sel:imageName:UpdateFleet' :: UpdateFleet -> Maybe Text
$sel:imageArn:UpdateFleet' :: UpdateFleet -> Maybe Text
$sel:idleDisconnectTimeoutInSeconds:UpdateFleet' :: UpdateFleet -> Maybe Int
$sel:iamRoleArn:UpdateFleet' :: UpdateFleet -> Maybe Text
$sel:enableDefaultInternetAccess:UpdateFleet' :: UpdateFleet -> Maybe Bool
$sel:domainJoinInfo:UpdateFleet' :: UpdateFleet -> Maybe DomainJoinInfo
$sel:displayName:UpdateFleet' :: UpdateFleet -> Maybe Text
$sel:disconnectTimeoutInSeconds:UpdateFleet' :: UpdateFleet -> Maybe Int
$sel:description:UpdateFleet' :: UpdateFleet -> Maybe Text
$sel:deleteVpcConfig:UpdateFleet' :: UpdateFleet -> Maybe Bool
$sel:computeCapacity:UpdateFleet' :: UpdateFleet -> Maybe ComputeCapacity
$sel:attributesToDelete:UpdateFleet' :: UpdateFleet -> Maybe [FleetAttribute]
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe [FleetAttribute]
attributesToDelete
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe ComputeCapacity
computeCapacity
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Bool
deleteVpcConfig
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
description
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Int
disconnectTimeoutInSeconds
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
displayName
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe DomainJoinInfo
domainJoinInfo
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Bool
enableDefaultInternetAccess
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
iamRoleArn
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Int
idleDisconnectTimeoutInSeconds
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
imageArn
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
imageName
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
instanceType
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Int
maxConcurrentSessions
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Int
maxUserDurationInSeconds
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
name
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe PlatformType
platform
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf
        Maybe S3Location
sessionScriptS3Location
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe StreamView
streamView
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf
        Maybe [Text]
usbDeviceFilterStrings
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe VpcConfig
vpcConfig

instance Data.ToHeaders UpdateFleet where
  toHeaders :: UpdateFleet -> 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
"PhotonAdminProxyService.UpdateFleet" ::
                          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 UpdateFleet where
  toJSON :: UpdateFleet -> Value
toJSON UpdateFleet' {Maybe Bool
Maybe Int
Maybe [Text]
Maybe [FleetAttribute]
Maybe Text
Maybe ComputeCapacity
Maybe DomainJoinInfo
Maybe PlatformType
Maybe S3Location
Maybe StreamView
Maybe VpcConfig
vpcConfig :: Maybe VpcConfig
usbDeviceFilterStrings :: Maybe [Text]
streamView :: Maybe StreamView
sessionScriptS3Location :: Maybe S3Location
platform :: Maybe PlatformType
name :: Maybe Text
maxUserDurationInSeconds :: Maybe Int
maxConcurrentSessions :: Maybe Int
instanceType :: Maybe Text
imageName :: Maybe Text
imageArn :: Maybe Text
idleDisconnectTimeoutInSeconds :: Maybe Int
iamRoleArn :: Maybe Text
enableDefaultInternetAccess :: Maybe Bool
domainJoinInfo :: Maybe DomainJoinInfo
displayName :: Maybe Text
disconnectTimeoutInSeconds :: Maybe Int
description :: Maybe Text
deleteVpcConfig :: Maybe Bool
computeCapacity :: Maybe ComputeCapacity
attributesToDelete :: Maybe [FleetAttribute]
$sel:vpcConfig:UpdateFleet' :: UpdateFleet -> Maybe VpcConfig
$sel:usbDeviceFilterStrings:UpdateFleet' :: UpdateFleet -> Maybe [Text]
$sel:streamView:UpdateFleet' :: UpdateFleet -> Maybe StreamView
$sel:sessionScriptS3Location:UpdateFleet' :: UpdateFleet -> Maybe S3Location
$sel:platform:UpdateFleet' :: UpdateFleet -> Maybe PlatformType
$sel:name:UpdateFleet' :: UpdateFleet -> Maybe Text
$sel:maxUserDurationInSeconds:UpdateFleet' :: UpdateFleet -> Maybe Int
$sel:maxConcurrentSessions:UpdateFleet' :: UpdateFleet -> Maybe Int
$sel:instanceType:UpdateFleet' :: UpdateFleet -> Maybe Text
$sel:imageName:UpdateFleet' :: UpdateFleet -> Maybe Text
$sel:imageArn:UpdateFleet' :: UpdateFleet -> Maybe Text
$sel:idleDisconnectTimeoutInSeconds:UpdateFleet' :: UpdateFleet -> Maybe Int
$sel:iamRoleArn:UpdateFleet' :: UpdateFleet -> Maybe Text
$sel:enableDefaultInternetAccess:UpdateFleet' :: UpdateFleet -> Maybe Bool
$sel:domainJoinInfo:UpdateFleet' :: UpdateFleet -> Maybe DomainJoinInfo
$sel:displayName:UpdateFleet' :: UpdateFleet -> Maybe Text
$sel:disconnectTimeoutInSeconds:UpdateFleet' :: UpdateFleet -> Maybe Int
$sel:description:UpdateFleet' :: UpdateFleet -> Maybe Text
$sel:deleteVpcConfig:UpdateFleet' :: UpdateFleet -> Maybe Bool
$sel:computeCapacity:UpdateFleet' :: UpdateFleet -> Maybe ComputeCapacity
$sel:attributesToDelete:UpdateFleet' :: UpdateFleet -> Maybe [FleetAttribute]
..} =
    [Pair] -> Value
Data.object
      ( forall a. [Maybe a] -> [a]
Prelude.catMaybes
          [ (Key
"AttributesToDelete" 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 [FleetAttribute]
attributesToDelete,
            (Key
"ComputeCapacity" 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 ComputeCapacity
computeCapacity,
            (Key
"DeleteVpcConfig" 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
deleteVpcConfig,
            (Key
"Description" 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
description,
            (Key
"DisconnectTimeoutInSeconds" 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
disconnectTimeoutInSeconds,
            (Key
"DisplayName" 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
displayName,
            (Key
"DomainJoinInfo" 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 DomainJoinInfo
domainJoinInfo,
            (Key
"EnableDefaultInternetAccess" 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
enableDefaultInternetAccess,
            (Key
"IamRoleArn" 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
iamRoleArn,
            (Key
"IdleDisconnectTimeoutInSeconds" 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
idleDisconnectTimeoutInSeconds,
            (Key
"ImageArn" 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
imageArn,
            (Key
"ImageName" 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
imageName,
            (Key
"InstanceType" 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
instanceType,
            (Key
"MaxConcurrentSessions" 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
maxConcurrentSessions,
            (Key
"MaxUserDurationInSeconds" 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
maxUserDurationInSeconds,
            (Key
"Name" 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
name,
            (Key
"Platform" 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 PlatformType
platform,
            (Key
"SessionScriptS3Location" 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 S3Location
sessionScriptS3Location,
            (Key
"StreamView" 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 StreamView
streamView,
            (Key
"UsbDeviceFilterStrings" 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]
usbDeviceFilterStrings,
            (Key
"VpcConfig" 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 VpcConfig
vpcConfig
          ]
      )

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

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

-- | /See:/ 'newUpdateFleetResponse' smart constructor.
data UpdateFleetResponse = UpdateFleetResponse'
  { -- | Information about the fleet.
    UpdateFleetResponse -> Maybe Fleet
fleet :: Prelude.Maybe Fleet,
    -- | The response's http status code.
    UpdateFleetResponse -> Int
httpStatus :: Prelude.Int
  }
  deriving (UpdateFleetResponse -> UpdateFleetResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: UpdateFleetResponse -> UpdateFleetResponse -> Bool
$c/= :: UpdateFleetResponse -> UpdateFleetResponse -> Bool
== :: UpdateFleetResponse -> UpdateFleetResponse -> Bool
$c== :: UpdateFleetResponse -> UpdateFleetResponse -> Bool
Prelude.Eq, ReadPrec [UpdateFleetResponse]
ReadPrec UpdateFleetResponse
Int -> ReadS UpdateFleetResponse
ReadS [UpdateFleetResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [UpdateFleetResponse]
$creadListPrec :: ReadPrec [UpdateFleetResponse]
readPrec :: ReadPrec UpdateFleetResponse
$creadPrec :: ReadPrec UpdateFleetResponse
readList :: ReadS [UpdateFleetResponse]
$creadList :: ReadS [UpdateFleetResponse]
readsPrec :: Int -> ReadS UpdateFleetResponse
$creadsPrec :: Int -> ReadS UpdateFleetResponse
Prelude.Read, Int -> UpdateFleetResponse -> ShowS
[UpdateFleetResponse] -> ShowS
UpdateFleetResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [UpdateFleetResponse] -> ShowS
$cshowList :: [UpdateFleetResponse] -> ShowS
show :: UpdateFleetResponse -> String
$cshow :: UpdateFleetResponse -> String
showsPrec :: Int -> UpdateFleetResponse -> ShowS
$cshowsPrec :: Int -> UpdateFleetResponse -> ShowS
Prelude.Show, forall x. Rep UpdateFleetResponse x -> UpdateFleetResponse
forall x. UpdateFleetResponse -> Rep UpdateFleetResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep UpdateFleetResponse x -> UpdateFleetResponse
$cfrom :: forall x. UpdateFleetResponse -> Rep UpdateFleetResponse x
Prelude.Generic)

-- |
-- Create a value of 'UpdateFleetResponse' 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:
--
-- 'fleet', 'updateFleetResponse_fleet' - Information about the fleet.
--
-- 'httpStatus', 'updateFleetResponse_httpStatus' - The response's http status code.
newUpdateFleetResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  UpdateFleetResponse
newUpdateFleetResponse :: Int -> UpdateFleetResponse
newUpdateFleetResponse Int
pHttpStatus_ =
  UpdateFleetResponse'
    { $sel:fleet:UpdateFleetResponse' :: Maybe Fleet
fleet = forall a. Maybe a
Prelude.Nothing,
      $sel:httpStatus:UpdateFleetResponse' :: Int
httpStatus = Int
pHttpStatus_
    }

-- | Information about the fleet.
updateFleetResponse_fleet :: Lens.Lens' UpdateFleetResponse (Prelude.Maybe Fleet)
updateFleetResponse_fleet :: Lens' UpdateFleetResponse (Maybe Fleet)
updateFleetResponse_fleet = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateFleetResponse' {Maybe Fleet
fleet :: Maybe Fleet
$sel:fleet:UpdateFleetResponse' :: UpdateFleetResponse -> Maybe Fleet
fleet} -> Maybe Fleet
fleet) (\s :: UpdateFleetResponse
s@UpdateFleetResponse' {} Maybe Fleet
a -> UpdateFleetResponse
s {$sel:fleet:UpdateFleetResponse' :: Maybe Fleet
fleet = Maybe Fleet
a} :: UpdateFleetResponse)

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

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